diff --git a/.Rbuildignore b/.Rbuildignore index a546bcda..950b63bf 100644 --- a/.Rbuildignore +++ b/.Rbuildignore @@ -30,3 +30,5 @@ vignettes/x0* ^CRAN-SUBMISSION$ ^scripts$ \.sass$ +manifest.json +^\.posit$ \ No newline at end of file diff --git a/.github/workflows/pkgdown.yaml b/.github/workflows/pkgdown.yaml index 84edbf33..6cc8e599 100644 --- a/.github/workflows/pkgdown.yaml +++ b/.github/workflows/pkgdown.yaml @@ -29,12 +29,9 @@ jobs: use-public-rspm: true - uses: r-lib/actions/setup-renv@v2 - with: - extra-packages: any::pkgdown, local::. - needs: website - - name: Install specific pkgdown version - run: install.packages("remotes") ; remotes::install_version("pkgdown", version = "2.0.3", repos = "cran.rstudio.com", dependencies = FALSE) + - name: Install dev dependencies + run: install.packages(c("pkgdown", "devtools", "covr")) shell: Rscript {0} - name: Install tidyCDISC @@ -42,7 +39,7 @@ jobs: run: R CMD INSTALL --preclean . - name: Build site - run: pkgdown::build_site_github_pages(new_process = FALSE, install = FALSE) + run: pkgdown::build_site_github_pages(new_process = FALSE, install = TRUE) shell: Rscript {0} - name: Deploy to GitHub pages 🚀 diff --git a/.github/workflows/test-coverage.yaml b/.github/workflows/test-coverage.yaml index 880e83bb..ce2bbc04 100644 --- a/.github/workflows/test-coverage.yaml +++ b/.github/workflows/test-coverage.yaml @@ -24,8 +24,10 @@ jobs: use-public-rspm: true - uses: r-lib/actions/setup-renv@v2 - with: - extra-packages: covr + + - name: Install dev dependencies + run: install.packages(c("devtools", "covr")) + shell: Rscript {0} - name: Install tidyCDISC shell: bash diff --git a/.gitignore b/.gitignore index 4145fd0b..6faaef61 100644 --- a/.gitignore +++ b/.gitignore @@ -8,3 +8,4 @@ docs/ revdep/ /doc/ /Meta/ +/.posit diff --git a/DESCRIPTION b/DESCRIPTION index 9ee87e15..6e206ab5 100644 --- a/DESCRIPTION +++ b/DESCRIPTION @@ -1,6 +1,6 @@ Package: tidyCDISC Title: Quick Table Generation & Exploratory Analyses on ADaM-Ish Datasets -Version: 0.2.1 +Version: 0.2.1.9000 Authors@R: c( person("Aaron", "Clark", , "clark.aaronchris@gmail.com", role = c("aut", "cre"), comment = c(ORCID = "0000-0002-0123-0970")), @@ -10,6 +10,8 @@ Authors@R: c( person("Maya", "Gans", , "maya.gans@biogen.com", role = "aut"), person("Robert", "Krajcik", , "robert.krajcik@biogen.com", role = "ctb"), person("Marly", "Gotti", , "marly.cormar@biogen.com", role = "ctb"), + person("Ryan", "Harrison", , "harrison.ryan.w@gmail.com", role = "aut", + comment = c(ORCID = "0000-0003-4575-006X")), person("Biogen", "Inc", role = "cph") ) Description: Provides users a quick exploratory dive into common @@ -36,40 +38,56 @@ License: AGPL (>= 3) URL: https://github.com/Biogen-Inc/tidyCDISC/, https://Biogen-Inc.github.io/tidyCDISC/ BugReports: https://github.com/Biogen-Inc/tidyCDISC/issues Depends: - R (>= 2.10) + R (>= 4.1) Imports: + arrow, + broom.helpers, cicerone, + cli, config, dplyr, DT, + fs, GGally, ggcorrplot, ggplot2, + ggsurvfit, glue, golem, gt, + gtsummary, haven, IDEAFilter, + pkgload, plotly, purrr, + readxl, rlang, rmarkdown, shiny, shinyjs, shinyWidgets, sjlabelled, + stringdist, stringr, survival, + tibble, tidyr, + tidyselect, timevis, - tippy (== 0.1.0) + tippy (== 0.1.0), + vroom Suggests: + devtools, knitr, + shinyalert, spelling, testthat VignetteBuilder: knitr +Config/Needs/website: pkgdown +Config/Needs/coverage: covr Encoding: UTF-8 Language: en-US LazyData: true -RoxygenNote: 7.2.3 +RoxygenNote: 7.3.3 diff --git a/NAMESPACE b/NAMESPACE index 728c434c..e76340f3 100644 --- a/NAMESPACE +++ b/NAMESPACE @@ -1,5 +1,8 @@ # Generated by roxygen2: do not edit by hand +S3method(error_handler,default) +S3method(error_handler,purrr_error_indexed) +S3method(error_handler,rlang_error) export(app_methods) export(col_for_list_expr) export(common_rownames) @@ -36,6 +39,11 @@ importFrom(ggplot2,ggplot) importFrom(ggplot2,labs) importFrom(ggplot2,scale_color_manual) importFrom(ggplot2,scale_x_continuous) +importFrom(ggsurvfit,add_censor_mark) +importFrom(ggsurvfit,add_confidence_interval) +importFrom(ggsurvfit,add_risktable) +importFrom(ggsurvfit,ggsurvfit) +importFrom(ggsurvfit,survfit2) importFrom(glue,glue) importFrom(golem,activate_js) importFrom(golem,add_resource_path) @@ -111,6 +119,7 @@ importFrom(shinyjs,useShinyjs) importFrom(sjlabelled,get_label) importFrom(sjlabelled,set_label) importFrom(stats,as.formula) +importFrom(stats,reformulate) importFrom(stringr,str_detect) importFrom(stringr,str_locate_all) importFrom(stringr,str_remove) diff --git a/NEWS.md b/NEWS.md index 4eb72db7..ca5b273d 100644 --- a/NEWS.md +++ b/NEWS.md @@ -1,3 +1,17 @@ +# tidyCDISC (development version) + +* Update wordlist +* Add Ryan Harrison as author + +### Population Explorer +* Refactor KM plots from plotly to ggsurvfit +* Add estimated median table to KM plot +* Add estimate survival probabilities table to KM plot +* Add time-axis ticks configuration to KM plot +* Enable multiple groups to KM plot +* Add Cox PH Hazard Ratios table to KM plot +* Add ADaM validation functions +* Allow more input file types: csv, parquet, txt, xls, xlsx # tidyCDISC 0.2.1 (CRAN Release) diff --git a/R/global.R b/R/global.R index 3ee7f870..e5c0fafe 100644 --- a/R/global.R +++ b/R/global.R @@ -1,6 +1,6 @@ utils::globalVariables(c( "AEDECOD", - "AESER", + "AESER", "AESEV", "AESTDT", "..prop..", @@ -29,17 +29,17 @@ utils::globalVariables(c( "value", "ymax", "ymin", - "stats", - "as.dist", - "cor", + "stats", + "as.dist", + "cor", "hclust", "PopuExplor", - "AVAL", - "AVISIT", - "AVISITN", - "CMDECOD", - "CMSTDT", - "DECODE", + "AVAL", + "AVISIT", + "AVISITN", + "CMDECOD", + "CMSTDT", + "DECODE", "DOMAIN", "END", "EVENTTYP", @@ -48,7 +48,7 @@ utils::globalVariables(c( "LBDY", "LBSTNRHI", "LBSTNRLO", - "MHCAT", + "MHCAT", "MHDECOD", "MHENDTC", "MHSTDTC", @@ -57,8 +57,8 @@ utils::globalVariables(c( "PARAMCD", "START", "USUBJID", - "VISIT", - "Visit", + "VISIT", + "Visit", "all_of", "className", "col_exist", @@ -74,7 +74,7 @@ utils::globalVariables(c( "hcl", "min_lbdt", "missing_disp", - "not_exist", + "not_exist", "not_exist_disp", "ord", "setNames", @@ -113,20 +113,73 @@ utils::globalVariables(c( "adtte", "warn", "dy_min", - "AEACN", "AEACNOTH", "AREL", "CNSR", "FASFL", "ITTFL", "LOWER", "Lower", - "MEAN", "Mean (SD)", - "Median", "Min | Max", "N", "PANEL", "Q1 | Q3", "SAFFL", "SEM", "STD", - "TRTEMFL", "UPPER", "Upper", - "Variable", "ae_data", "avals_by", "bds_data", "colour", "colour2", - "corr", "corr_lab", - "corr_lab_hover", "descr", "grp", "id_block", "id_desc", "id_rn", - "id_stat", "inner_sort", - "lab", "n_subgroups", "n_tot", "orig_id_rn", "orig_var_rn", "param_x", - "param_y", "pt", "pval", - "pval_hover", "sort_n", "v", "var", "var_rn", "where", "y", - "type", "title" - ,":=", - "DATE", "EVENT_TIME", "DATE_ST", "DECODE_ST", "DATE_EN", "DECODE_EN" + "AEACN", + "AEACNOTH", + "AREL", + "CNSR", + "FASFL", + "ITTFL", + "LOWER", + "Lower", + "MEAN", + "Mean (SD)", + "Median", + "Min | Max", + "N", + "PANEL", + "Q1 | Q3", + "SAFFL", + "SEM", + "STD", + "TRTEMFL", + "UPPER", + "Upper", + "Variable", + "ae_data", + "avals_by", + "bds_data", + "colour", + "colour2", + "corr", + "corr_lab", + "corr_lab_hover", + "descr", + "grp", + "id_block", + "id_desc", + "id_rn", + "id_stat", + "inner_sort", + "lab", + "n_subgroups", + "n_tot", + "orig_id_rn", + "orig_var_rn", + "param_x", + "param_y", + "pt", + "pval", + "pval_hover", + "sort_n", + "v", + "var", + "var_rn", + "where", + "y", + "type", + "title", + ":=", + "DATE", + "EVENT_TIME", + "DATE_ST", + "DECODE_ST", + "DATE_EN", + "DECODE_EN", + "time", + "est_ci", + "Strata", + "0.95LCL", + "0.95UCL", + "label", + "id" )) - - diff --git a/R/mod_dataUpload.R b/R/mod_dataUpload.R index e247fa3e..7823eeb6 100644 --- a/R/mod_dataUpload.R +++ b/R/mod_dataUpload.R @@ -41,7 +41,8 @@ mod_dataUpload_ui <- function(id){ div(style="display: inline-block; ",h3("Data upload")), div(style="display: inline-block; float:right;",mod_dataComplyRules_ui("dataComplyRules_ui_1")), HTML("
ADSL file is mandatory & BDS/ OCCDS files are optional"), - fileInput(ns("file"), "Upload sas7bdat files",accept = c(".sas7bdat"), multiple = TRUE), + # fileInput(ns("file"), "Upload sas7bdat files",accept = c(".sas7bdat"), multiple = TRUE), + fileInput(ns("file"), "Upload datasets", accept = c(".txt", ".csv", ".xls", ".xlsx", ".sas7bdat"), multiple = TRUE), uiOutput(ns("radio_test")) ) ), @@ -91,18 +92,25 @@ mod_dataUpload_server <- function(input, output, session){ data_list <- list() ## data list - for (i in 1:nrow(input$file)){ - if(length(grep(".sas7bdat", input$file$name[i], ignore.case = TRUE)) > 0){ - data_list[[i]] <- haven::zap_formats(haven::read_sas(input$file$datapath[i])) %>% - dplyr::mutate(dplyr::across(.cols = where(is.character), - .fns = na_if, y = "")) - }else{ - data_list[[i]] <- NULL - } - } + # for (i in 1:nrow(input$file)){ + # if(length(grep(".sas7bdat", input$file$name[i], ignore.case = TRUE)) > 0){ + # data_list[[i]] <- haven::zap_formats(haven::read_sas(input$file$datapath[i])) %>% + # dplyr::mutate(dplyr::across(.cols = where(is.character), + # .fns = na_if, y = "")) + # }else{ + # data_list[[i]] <- NULL + # } + # } + + data_list <- input$file$datapath |> + purrr::map(\(x) { + read_data(x) + }) |> + purrr::set_names(toupper(tools::file_path_sans_ext(input$file$name))) + # names - names(data_list) <- toupper(stringr::str_remove(input$file$name, ".sas7bdat")) + # names(data_list) <- toupper(stringr::str_remove(input$file$name, ".sas7bdat")) @@ -111,11 +119,19 @@ mod_dataUpload_server <- function(input, output, session){ id = NULL, #"dataComply_ui_1", datalist = reactive(data_list)) + # if(length(names(dl_comply)) > 0){ + # # append to existing reactiveValues list + # dd$data <- c(dd$data, dl_comply) # dl_comply # + + # } if(length(names(dl_comply)) > 0){ - # append to existing reactiveValues list - dd$data <- c(dd$data, dl_comply) # dl_comply # + # Normalize ADaM dataset names based on domain validation + dl_normalized <- normalize_adam_datasets(dl_comply) + # append to existing reactiveValues list + dd$data <- c(dd$data, dl_normalized) } + # set dd$current to FALSE for previous & TRUE for current uploads dd$current <- c(rep(FALSE, length(dd$current)), rep(TRUE, length(data_list))) diff --git a/R/mod_indvExp_srv.R b/R/mod_indvExp_srv.R index b066e235..c2046bc4 100644 --- a/R/mod_indvExp_srv.R +++ b/R/mod_indvExp_srv.R @@ -51,7 +51,7 @@ mod_indvExp_server <- function(input, output, session, datafile){ my_loaded_adams <- reactive({ req(!is.null(datafile())) sasdata0 <- toupper(names(datafile())) - sasdata <- names(which(sapply(sasdata0,function(df) { return(stringr::str_detect(toupper(df),"^AD[A-Z0-9\\_]+")) }))) + sasdata <- names(which(sapply(sasdata0,function(df) { return(stringr::str_detect(toupper(df),"^AD")) }))) return(sasdata) }) diff --git a/R/mod_popExp.R b/R/mod_popExp.R index 3f15b1ab..8633fc01 100644 --- a/R/mod_popExp.R +++ b/R/mod_popExp.R @@ -46,7 +46,15 @@ mod_popExp_server <- function(input, output, session, datafile) { req(!is.null(datafile())) # wait until ADSL has been selected - req("ADSL" %in% names(datafile()) ) + adsl_datasets <- names(datafile())[sapply(names(datafile()), \(name) { + validation <- validate_adamish(datafile()[[name]]) + return(validation$domain == "ADSL") + })] + + req(length(adsl_datasets) > 0) + adsl_name <- adsl_datasets[1] + + # req("ADSL" %in% names(datafile()) ) ##################################################################### # The data used by the population explorer is going to be one of: @@ -56,13 +64,18 @@ mod_popExp_server <- function(input, output, session, datafile) { ###################################################################### # Isolate ADSL - if ("ADSL" %in% names(datafile())) { - ADSL <- datafile()$ADSL %>% + # if ("ADSL" %in% names(datafile())) { + # ADSL <- datafile()$ADSL %>% + # haven::zap_formats() + # } + if (length(adsl_datasets) > 0) { + ADSL <- datafile()[[adsl_name]] |> haven::zap_formats() } # split the non-ADSL data into those which have a USUBJID or not - NOTADSL <- datafile()[names(datafile()) != "ADSL" ] + # NOTADSL <- datafile()[names(datafile()) != "ADSL" ] + NOTADSL <- datafile()[!names(datafile()) %in% adsl_datasets] if (!rlang::is_empty(NOTADSL)) { # zap formats @@ -138,7 +151,15 @@ mod_popExp_server <- function(input, output, session, datafile) { my_loaded_adams <- reactive({ req(!is.null(datafile())) sasdata0 <- toupper(names(datafile())) - sasdata <- names(which(sapply(sasdata0,function(df) { return(stringr::str_detect(toupper(df),"^AD[A-Z0-9\\_]+")) }))) + sasdata <- names( + which( + sapply( + sasdata0, function(df) { + return(stringr::str_detect(toupper(df),"^AD")) + }) + ) + ) + return(sasdata) }) @@ -151,7 +172,14 @@ mod_popExp_server <- function(input, output, session, datafile) { observeEvent(my_loaded_adams(), { # req(any(substr(my_loaded_adams(), 1, 4) == "ADTT")) # adtt_ <- my_loaded_adams()[substr(my_loaded_adams(), 1, 4) == "ADTT"] - req(any(purrr::map_lgl(my_loaded_adams(), ~ "CNSR" %in% colnames(datafile()[[.x]])))) + # req(any(purrr::map_lgl(my_loaded_adams(), ~ "CNSR" %in% colnames(datafile()[[.x]])))) + tte_datasets <- names(datafile())[sapply(names(datafile()), \(name) { + validation <- validate_adamish(datafile()[[name]]) + return(validation$domain == "ADTTE" || "CNSR" %in% names(datafile()[[name]])) + })] + + req(length(tte_datasets) > 0) + updateRadioButtons(session, "plot_type", choices = c("Kaplan-Meier Curve", "Line plot - mean over time", @@ -272,7 +300,9 @@ mod_popExp_server <- function(input, output, session, datafile) { # use plot output of the module to create the plot - output$plot_output <- renderPlotly({ + # Interactive plotly plot + output$plot_output_plotly <- renderPlotly({ + req(input$plot_type != "Kaplan-Meier Curve") switch(input$plot_type, `Scatter Plot` = p_scatter() %>% plotly::ggplotly() %>% plotly::layout(title = list(yref = "container", y = .95, yanchor = "bottom")), @@ -281,20 +311,162 @@ mod_popExp_server <- function(input, output, session, datafile) { `Line plot - mean over time` = p_line$plot() %>% plotly::ggplotly(tooltip = c("text")) %>% plotly::layout(title = list(yref = "container", y = .95, yanchor = "bottom")), - `Heatmap - endpoint correlations` = p_heatmap$plot() %>% plotly::ggplotly(tooltip = c("text")) - , `Kaplan-Meier Curve` = p_km() %>% plotly::ggplotly() + `Heatmap - endpoint correlations` = p_heatmap$plot() %>% plotly::ggplotly(tooltip = c("text"))#, + #`Kaplan-Meier Curve` = p_km() %>% plotly::ggplotly(), + ) %>% - config(displaylogo = FALSE, - modeBarButtonsToRemove = - c("zoom2d", "pan2d", "select2d", "lasso2d", "zoomIn2d", "zoomOut2d", "autoScale2d", "resetScale2d", - "hoverClosestCartesian", "hoverCompareCartesian", "zoom3d", "pan3d", - "resetCameraDefault3d", "resetCameraLastSave3d", "hoverClosest3d", - "orbitRotation", "tableRotation", "zoomInGeo", "zoomOutGeo", - "resetGeo", "hoverClosestGeo", "sendDataToCloud","hoverClosestGl2d", - "hoverClosestPie", "toggleHover","resetViews","toggleSpikelines","resetViewMapbox" - # , 'toImage', 'resetScale2d', 'zoomIn2d', 'zoomOut2d','zoom2d', 'pan2d' - ) + config( + displaylogo = FALSE, + modeBarButtons = list( + list("zoom2d"), + list("pan2d"), + list("toImage") + ), + toImageButtonOptions = list( + format = c("png"), + filename = glue::glue("{input$plot_type}_{Sys.Date()}"), + width = 1200, + height = 800, + scale = 2 + ) + ) + }) + + # Static plots, for ggsurvfit KM plot + + km_result <- reactive({ + req(input$plot_type == "Kaplan-Meier Curve") + p_km() + }) + + output$plot_output_gg <- renderPlot({ + km_result()$plot_km + }) + + # KM Estimated Median Time table + output$km_median_table <- gt::render_gt({ + df <- km_result()$table_median + + time_cols <- setdiff(names(df), "Strata") + + df |> + gt::gt() |> + gt::tab_options( + table.width = gt::px(700), + table.font.size = "small" + ) |> + gt::cols_label(Strata = "Group") |> + gt::fmt_missing( + missing_text = "-" + ) |> + gt::cols_align( + align = "center", + columns = time_cols + ) |> + gt::fmt_markdown(columns = everything()) |> + gt::tab_style( + locations = list( + gt::cells_column_labels(columns = everything()), + gt::cells_column_spanners(spanners = everything()) + ), + style = list( + gt::cell_borders(sides = "bottom", weight = gt::px(1)), + gt::cell_text(weight = "bold") + ) + ) + }) + + # Cox Table + output$km_cox_table <- gt::render_gt({ + df <- km_result()$table_cox + if (!rlang::is_null(df)) { + + df <- gtsummary::as_gt(df) |> + gt::cols_hide(columns = c("p.value")) |> + gt::tab_options( + table.width = gt::px(700), + table.font.size = "small" + ) |> + gt::fmt_missing( + missing_text = "-" + ) |> + gt::cols_align( + align = "center", + columns = !label + ) |> + # gt::fmt_markdown(columns = everything()) |> + gt::tab_style( + locations = list( + gt::cells_column_labels(columns = everything()), + gt::cells_column_spanners(spanners = everything()) + ), + style = list( + gt::cell_borders(sides = "bottom", weight = gt::px(1)), + gt::cell_text(weight = "bold") ) + ) + + return(df) + } + + }) + + # KM Estimated Survival probability table + output$km_est_table <- gt::render_gt({ + df <- km_result()$table_est + + time_cols <- setdiff(names(df), "Strata") + + df |> + gt::gt() |> + gt::tab_options( + table.width = gt::px(700), + table.font.size = "small" + ) |> + gt::tab_spanner( + label = ("Time"), + columns = time_cols + ) |> + gt::cols_label(Strata = "Group") |> + gt::fmt_missing( + missing_text = "-" + ) |> + gt::cols_align( + align = "center", + columns = time_cols + ) |> + gt::fmt_markdown(columns = everything()) |> + gt::tab_style( + locations = list( + gt::cells_column_labels(columns = everything()), + gt::cells_column_spanners(spanners = everything()) + ), + style = list( + gt::cell_borders(sides = "bottom", weight = gt::px(1)), + gt::cell_text(weight = "bold") + ) + ) + }) + + # Dynamic UI for plots + output$dynamic_plot_ui <- renderUI({ + if (input$plot_type == "Kaplan-Meier Curve") { + req(km_result()) + + tagList( + plotOutput(ns("plot_output_gg"), height = 700), + tags$br(), + tags$h4("Estimated Survival Probability (95% CI) over Time"), + gt::gt_output(ns("km_est_table")), + tags$br(), + tags$h4("Median Survival Time (95% CI)"), + gt::gt_output(ns("km_median_table")), + tags$h4("Hazard Ratios (95% CI)"), + gt::gt_output(ns("km_cox_table")) + ) + } else { + plotlyOutput(ns("plot_output_plotly"), height = 700) + } }) # Output text string of what was filtered in IDEAFilter widget/ module diff --git a/R/mod_popExp_fct_km.R b/R/mod_popExp_fct_km.R index 72194749..3539b52f 100644 --- a/R/mod_popExp_fct_km.R +++ b/R/mod_popExp_fct_km.R @@ -1,86 +1,231 @@ #' Kaplan-Meier Curve -#' +#' #' Create scatter plot where if the variables are numeric then they -#' are plotted, and if they are PARAMCD's then a week and value +#' are plotted, and if they are PARAMCD's then a week and value #' must be selected for plotting. -#' +#' #' @param data Merged data to be used in plot -#' @param yvar Selected xy-axis -#' @param resp_var character, the response variable (paramcd) -#' @param cnsr_var character, the censor variable. Usually CNSR -#' @param group character, variable name of grouping variable (categorical or factor) -#' @param points logical, whether to plot + symbols when patients censored -#' @param ci logical, whether the curve(s) should be accompanied with a 95\% CI -#' +#' @param yvar Selected xy-axis +#' @param response_var character, the response variable (paramcd) +#' @param censor_var character, the censor variable. Usually CNSR +#' @param CI logical, whether the curve(s) should be accompanied with a 95\% CI +#' @param risk_table logical, whether to display risk table below plot +#' @param censor_mark logical, whether to plot + symbols when patients censored +#' @param strata character, variable name(s) of strata variable(s) (categorical or factor) +#' @param covariates character, variable name(s) of covariate variable(s) (categorical or factor) +#' #' @importFrom stats as.formula #' @importFrom GGally ggsurv #' @importFrom survival survfit Surv -#' +#' @importFrom ggsurvfit survfit2 ggsurvfit add_risktable add_confidence_interval add_censor_mark +#' @importFrom stats reformulate +#' #' @family popExp functions #' @keywords popEx -#' +#' #' @return A ggplot object containing the KM curve plot -#' +#' #' @noRd -app_km_curve <- function(data, yvar, resp_var, cnsr_var, group = "NONE", points = TRUE, ci = FALSE) { - - resp_var_sym <- rlang::sym(resp_var) - - # Filter data by param selected +app_km_curve <- function( + data, + yvar, + response_var, + censor_var, + CI, + risk_table, + censor_mark, + median_line, + strata = NULL, + covariates = NULL, + time_ticks = NULL +) { + # Symbols + response_var <- rlang::sym(response_var) + censor_var <- rlang::sym(censor_var) + + # Filter to selected PARAMCD retaining all columns suppressWarnings( - d <- data %>% - dplyr::filter(PARAMCD == yvar) %>% - dplyr::select(USUBJID, PARAM, PARAMCD, one_of(resp_var), one_of(cnsr_var), one_of(group)) %>% - filter(!is.na(!!resp_var_sym)) %>% - dplyr::distinct() + d_param <- data |> + dplyr::filter(PARAMCD == yvar) ) - # print(d) - # if(group != "NONE"){ - # group_counts <- - # d %>% - # group_by_at(vars(one_of(group))) %>% - # summarize(n = n()) - # print(group_counts) - # } - - - fit_formula <- paste0("survival::Surv(",resp_var,", ",cnsr_var,") ~ ", - if(group != "NONE" & !rlang::is_empty(group)) group else 1) - fit <- survival::survfit(as.formula(fit_formula),data = d) - # print(fit_formula) - # print(fit) - # print(summary(fit)) - - # Initialize title of variables plotted - # if group used, include those "by" variables in title - by_title <- case_when( - group != "NONE" ~ paste("\nby", best_lab(data, group)), - TRUE ~ "" + + d_model <- d_param |> + dplyr::filter(!is.na(!!response_var)) |> + dplyr::distinct() + + # Package checks + rlang::check_installed("survival", reason = "to use this function.") + rlang::check_installed("ggsurvfit", reason = "to use this function.") + rlang::check_installed("purrr", reason = "to use this function.") + + if (!is.data.frame(data)) { + cli::cli_abort("{.arg data} must be a dataframe.") + } + if (!rlang::is_symbol(rlang::enexpr(response_var))) { + cli::cli_abort("{.arg response_var} must be an unquoted column name.") + } + if (!rlang::is_symbol(rlang::enexpr(censor_var))) { + cli::cli_abort("{.arg censor_var} must be an unquoted column name.") + } + + # LHS construction + LHS <- glue::glue( + "survival::Surv({rlang::ensym(response_var)}, {rlang::ensym(censor_var)})" ) - - # generate plot - p <- - GGally::ggsurv(fit, - order.legend = FALSE, # use data order, not survival order - CI = ci, - plot.cens = points) + - # survminer::ggsurvplot(fit,conf.int = ci) + # didn't work - ggplot2::xlab(glue::glue("{unique(d$PARAM)}")) + - ggplot2::theme_bw() + + if ( + rlang::as_label(censor_var) == "CNSR" && + rlang::as_label(response_var) == "AVAL" + ) { + LHS <- glue::glue( + "ggsurvfit::Surv_CNSR({rlang::ensym(response_var)}, {rlang::ensym(censor_var)})" + ) + } + + # Remove sentinel values + strata <- setdiff(strata, "NONE") + covariates <- setdiff(covariates, "NONE") + + # RHS for KM fit (strata only) + if (length(strata) == 0) { + RHS <- "1" + no_strata <- TRUE + } else { + RHS <- strata + no_strata <- FALSE + } + + # Ensure required columns exist + needed <- unique(c( + rlang::as_label(response_var), + rlang::as_label(censor_var), + strata, + covariates + )) + missing_vars <- setdiff(needed, colnames(d_model)) + if (length(missing_vars) > 0) { + cli::cli_abort("Missing {missing_vars} column{?s} in filtered data.") + } + + fit_formula <- stats::reformulate(response = LHS, termlabels = RHS) + fit <- ggsurvfit::survfit2(fit_formula, data = d_model) + + by_title <- if (no_strata) "" else { + glue::glue( + "\nby {glue::glue_collapse(purrr::map_chr(strata, ~ best_lab(d_model, .x)), sep = ', ', last = ' and ')}" + ) + } + + # Build base plot to get automatic breaks + base_p <- ggsurvfit::ggsurvfit(fit) + auto_breaks <- ggplot2::ggplot_build(base_p)$layout$panel_params[[1]]$x$breaks + + # Determine final ticks (user-specified or defaults). Server parse already + # ensures numeric, non-negative, unique values; just range-filter here. + ticks <- time_ticks + if (is.null(ticks) || length(ticks) == 0) { + ticks <- auto_breaks + } else { + rng <- range(d_model[[rlang::as_label(response_var)]], na.rm = TRUE) + # Force lower bound to 0 to allow baseline tick even if earliest observed time > 0 + rng[1] <- 0 + # Keep ticks within upper range but never drop 0 if user specified it + ticks <- ticks[ticks <= rng[2]] + if (0 %in% time_ticks && !(0 %in% ticks)) { + ticks <- c(0, ticks) + } + ticks <- sort(unique(ticks)) + if (length(ticks) == 0) ticks <- auto_breaks + } + + p2 <- base_p + + (if (risk_table) ggsurvfit::add_risktable(risktable_stats = c("n.risk"), time_breaks = ticks)) + + (if (CI) ggsurvfit::add_confidence_interval()) + + (if (censor_mark) ggsurvfit::add_censor_mark()) + + (if (median_line) ggsurvfit::add_quantile(y_value = 0.5)) + ggplot2::theme( text = ggplot2::element_text(size = 12), axis.text = ggplot2::element_text(size = 12), plot.title = ggplot2::element_text(size = 16) ) + - ggplot2::ggtitle(paste(unique(d$PARAM), by_title) - # ,subtitle = paste(by_title) # plotly won't automatically accept this + ggplot2::ggtitle(glue::glue("{unique(d_model$PARAM)} {by_title}")) + + (if (!no_strata) + ggplot2::theme(plot.margin = ggplot2::margin(t = 1.2, unit = "cm"))) + + ggplot2::scale_x_continuous(breaks = ticks, minor_breaks = NULL) + + table_est <- ggsurvfit::tidy_survfit( + fit, + times = ticks, + type = "survival" + ) |> + (\(x) { + if (!"strata" %in% names(x)) { + dplyr::mutate(x, strata = "Overall") + } else { + x + } + })() |> + dplyr::mutate( + est_ci = glue::glue( + "{round(estimate, 2)} ({round(conf.low, 2)}, {round(conf.high, 2)})" + ) + ) |> + dplyr::select(Strata = strata, time, est_ci) |> + dplyr::filter(time > 0) |> + dplyr::mutate( + est_ci = dplyr::if_else(est_ci == "NA (NA, NA)", "-", est_ci) + ) |> + tidyr::pivot_wider(names_from = time, values_from = est_ci) + + table_median0 <- summary(fit)$table + table_median1 <- if (no_strata) { + dplyr::bind_rows(table_median0) |> + dplyr::mutate(Strata = "Overall") + } else { + tibble::as_tibble(table_median0, rownames = "Strata") + } + table_median <- table_median1 |> + dplyr::select(Strata, median, `0.95LCL`, `0.95UCL`) |> + dplyr::mutate( + est_ci = glue::glue( + "{round(median, 2)} ({round(`0.95LCL`, 2)}, {round(`0.95UCL`, 2)})" + ) + ) |> + dplyr::select(Strata, `Median (95% CI)` = est_ci) |> + dplyr::mutate( + Strata = stringr::str_replace_all( + Strata, + "(^|,\\s*)[^=,]+\\s*=\\s*", + "\\1" + ) ) - - # Add in plot layers conditional upon user selection - if (by_title != "") { - p <- p + ggplot2::theme(plot.margin = ggplot2::margin(t = 1.2, unit = "cm")) #+ - # survminer::ggsurvplot_group_by(fit, group.by = group) + + # Cox PH model construction + no_covar <- length(covariates) == 0 + termlabels <- NULL + if (!no_strata && no_covar) { + termlabels <- strata + } else if (no_strata && !no_covar) { + termlabels <- covariates + } else if (!no_strata && !no_covar) { + termlabels <- unique(c(strata, covariates)) } - - return(p) + + table_cox <- NULL + if (!is.null(termlabels) && length(termlabels) > 0) { + cox_formula <- stats::reformulate(response = LHS, termlabels = termlabels) + cox_fit <- survival::coxph(cox_formula, data = d_model) + table_cox <- gtsummary::tbl_regression( + cox_fit, + exponentiate = TRUE, + conf.level = 0.95, + add_estimate_to_reference_rows = TRUE + ) + } + + list( + plot_km = p2, + table_est = table_est, + table_median = table_median, + table_cox = table_cox + ) } diff --git a/R/mod_popExp_km.R b/R/mod_popExp_km.R index 439e8bc6..ac9d325b 100644 --- a/R/mod_popExp_km.R +++ b/R/mod_popExp_km.R @@ -11,7 +11,7 @@ #' #' @family popExp Functions #' @noRd -#' +#' km_ui <- function(id, label = "km") { ns <- NS(id) tagList( @@ -19,18 +19,103 @@ km_ui <- function(id, label = "km") { wellPanel( fluidRow( column(6, selectInput(ns("yvar"), "Select param", choices = NULL)), - column(6, selectInput(ns("resp_var"), "Response Variable", choices = "AVAL",selected = "AVAL")) + column( + 6, + selectInput( + ns("resp_var"), + "Response Variable", + choices = "AVAL", + selected = "AVAL" + ) + ) ), fluidRow( - column(6, selectInput(ns("group"), "Group By", choices = "NONE", selected = "NONE")), - column(6, selectInput(ns("cnsr_var"), "Censor Variable (0,1)", choices = "CNSR", selected = "CNSR")) + column( + 6, + selectizeInput( + ns("group"), + "Group By", + choices = "NONE", + selected = "NONE", + multiple = TRUE, + options = list( + render = I("{ + option: function(item, escape){ + return '
' + escape(item.label) + '
'; + } + }") + ) + ) + ), + column( + 6, + selectInput( + ns("cnsr_var"), + "Censor Variable (0,1)", + choices = "CNSR", + selected = "CNSR" + ) + ) + ), + shinyWidgets::materialSwitch( + ns("points"), + h6("Mark censored observations?"), + status = "primary", + value = TRUE + ), + shinyWidgets::materialSwitch( + ns("ci"), + h6("Include 95% confidence interval?"), + status = "primary", + value = FALSE + ), + shinyWidgets::materialSwitch( + ns("risk_table"), + h6("Include risk table?"), + status = "primary", + value = TRUE ), - shinyWidgets::materialSwitch(ns("points"), h6("Mark censored observations?"), - status = "primary", value = TRUE), - shinyWidgets::materialSwitch(ns("ci"), h6("Include 95% confidence interval?"), - status = "primary", value = FALSE) + shinyWidgets::materialSwitch( + ns("median_line"), + h6("Include median line(s)?"), + status = "primary", + value = TRUE + ) + + , tags$hr(), + h4("Time Axis Tick Marks"), + helpText("Enter comma, space, or semicolon separated time values (numeric). Leave blank for defaults."), + textInput(ns("time_ticks_raw"), label = NULL, placeholder = "e.g. 0, 12, 24, 36, 48"), + actionLink(ns("time_ticks_clear"), "Clear"), + tags$small("Invalid or out-of-range values are ignored; blanks use defaults." ) + # checkboxInput(ns("points"), "Mark censored observations?", value = TRUE), # checkboxInput(ns("ci"), "Include 95% confidence interval?", value = FALSE) + ), + h4("Cox Proportional Hazards Model"), + wellPanel( + fluidRow( + column( + 12, + selectizeInput( + ns("covariates"), + "Covariates", + choices = "NONE", + selected = "NONE", + multiple = TRUE, + options = list( + render = I("{ + option: function(item, escape){ + return '
' + escape(item.label) + '
'; + } + }") + ) + ) + ) + ), + fluidRow( + column(12, uiOutput(ns("ref_group_ui"))) + ) ) ) } @@ -39,7 +124,7 @@ km_ui <- function(id, label = "km") { #' Kaplan-Meier Curve Server Function #' #' Using the widgets from the km UI create -#' a ggplot object which is returned to the +#' a ggplot object which is returned to the #' parent Population Explorer module #' #' @param input,output,session Internal parameters for {shiny}. @@ -53,114 +138,282 @@ km_ui <- function(id, label = "km") { #' #' @family popExp Functions #' @noRd -#' +#' km_srv <- function(input, output, session, data, run) { ns <- session$ns - + observe({ req(run(), data()) - + # get unique paramcd + paramcd <- sort(na.omit(unique(data()$PARAMCD))) - updateSelectInput(session, "yvar", - choices = as.list(paramcd), - selected = isolate(input$yvar) + updateSelectInput( + session, + "yvar", + choices = as.list(paramcd), + selected = isolate(input$yvar) ) }) - - + # update response variable options for user based on data filtered to a # certain param observeEvent(input$yvar, { req(run(), input$yvar != "") - + d <- data() - my_vars <- d %>% - dplyr::filter(PARAMCD == input$yvar) %>% + my_vars <- d %>% + dplyr::filter(PARAMCD == input$yvar) %>% dplyr::filter(data_from == "ADTTE") %>% # Numeric visit var has to exist in TTE data - select(one_of("AVISITN", "VISITNUM"), ends_with("DY")) %>% - select_if(~!all(is.na(.))) %>% # remove NA cols + select(one_of("AVISITN", "VISITNUM"), ends_with("DY")) %>% + select_if(~ !all(is.na(.))) %>% # remove NA cols colnames() - - updateSelectInput ( + + updateSelectInput( session = session, inputId = "resp_var", choices = c("AVAL", my_vars), selected = isolate(input$resp_var) ) }) - + # update censor variable options for user based on data filtered to a # certain param observeEvent(input$yvar, { req(run(), input$yvar != "") - + # col <- c(1:4) # col <- c(0, 1, 1, 1) # col <- c(1, 1, 1) - + d0 <- data() - my_cvars <- d0 %>% - dplyr::filter(PARAMCD == input$yvar) %>% + my_cvars <- d0 %>% + dplyr::filter(PARAMCD == input$yvar) %>% dplyr::filter(data_from == "ADTTE") %>% # Numeric visit var has to exist in TTE data select(where(is.numeric)) %>% - select(where(function(col) all( unique(col) %in% c(0,1) ))) %>% - select_if(~!all(is.na(.))) %>% # remove NA cols + select(where(function(col) all(unique(col) %in% c(0, 1)))) %>% + select_if(~ !all(is.na(.))) %>% # remove NA cols colnames() - - updateSelectInput ( + + updateSelectInput( session = session, inputId = "cnsr_var", choices = c("CNSR", my_cvars[my_cvars != "CNSR"]), selected = isolate(input$cnsr_var) ) }) - - + observeEvent(input$yvar, { req(run(), input$yvar != "") - + # yvar paramcd - group_dat <- data() %>% - dplyr::filter(PARAMCD == input$yvar) %>% - select_if(~!all(is.na(.))) # remove NA cols - + group_dat <- data() %>% + dplyr::filter(PARAMCD == input$yvar) %>% + select_if(~ !all(is.na(.))) # remove NA cols + # character and factor columns for grouping or faceting (separating) char_col <- subset_colclasses(group_dat, is.character) fac_col <- subset_colclasses(group_dat, is.factor) - group <- sort(c(fac_col, char_col)) + log_col <- subset_colclasses(group_dat, is.logical) + num_col <- subset_colclasses(group_dat, is.numeric) + + group <- sort(c(fac_col, char_col, log_col)) # print("char_col:") # print(char_col) # print("fac_col:") # print(fac_col) # print(".") # print(".") - + # remove some variables... grp <- group[!(group %in% c("data_from", "PARAM", "PARAMCD", "USUBJID"))] - + # populate dropdowns with choices - updateSelectInput(session, "group", - choices = c("NONE", grp), - selected = isolate(input$group)) - + updateSelectizeInput( + session, + "group", + choices = c("NONE", grp), + selected = isolate(input$group) + ) + + covar <- sort(c(fac_col, char_col, log_col, num_col)) + covar2 <- covar[!(covar %in% c("data_from", "PARAM", "PARAMCD", "USUBJID"))] + + updateSelectizeInput( + session, + "covariates", + choices = c("NONE", covar2), + selected = isolate(input$covariates) + ) + }) + + observeEvent(input$group, { + req(input$group) + # Remove sentinel NONE if any real strata selected + if ("NONE" %in% input$group & length(input$group) > 1) { + cleaned <- setdiff(input$group, "NONE") + # Avoid triggering extra invalid intermediate state + isolate({ + updateSelectizeInput( + session, + "group", + selected = cleaned + ) + }) + return(NULL) + } else if ( + !is.null(input$group) & + !("NONE" %in% input$group) & + length(input$group) >= 1 + ) { + # If any real variable is selected, remove "NONE" + if ("NONE" %in% input$group) { + updateSelectizeInput( + session, + "group", + selected = setdiff(input$group, "NONE") + ) + } + } + }) + # New covariates observer + observeEvent(input$covariates, { + req(input$covariates) + if ("NONE" %in% input$covariates && length(input$covariates) > 1) { + isolate( + updateSelectizeInput( + session, + "covariates", + selected = setdiff(input$covariates, "NONE") + ) + ) + } + }) + + # helper to create safe ids + make_valid_id <- function(x) gsub("[^A-Za-z0-9]", "_", x) + + # reactive: categorical vars among selected strata + covariates + categorical_vars <- reactive({ + req(run(), data(), input$yvar) + + d_sub <- data() |> + dplyr::filter(PARAMCD == input$yvar) + + sel <- unique(c( + if (!is.null(input$group) & !("NONE" %in% input$group)) input$group else + character(), + if (!is.null(input$covariates) & !("NONE" %in% input$covariates)) + input$covariates else character() + )) + + if (length(sel) == 0) return(character()) + + # keep only categorical (factor / character / logical) + keep <- sel[vapply( + sel, + function(v) { + col <- d_sub[[v]] + is.factor(col) || is.character(col) || is.logical(col) + }, + logical(1) + )] + keep + }) + + # UI for reference selectors + output$ref_group_ui <- renderUI({ + vars <- categorical_vars() + if (length(vars) == 0) return(NULL) + + d_sub <- data() |> dplyr::filter(PARAMCD == input$yvar) + + tagList( + h5("Reference groups (Cox PH):"), + lapply(vars, \(v) { + col <- d_sub[[v]] + lvls <- if (is.factor(col)) levels(col) else sort(unique(col)) + # exclude NA + lvls <- lvls[!is.na(lvls)] + selectInput( + inputId = ns(paste0("ref_", make_valid_id(v))), + label = v, + choices = lvls, + selected = lvls[1] + ) + }) + ) + }) + + # reactive: apply releveling + km_model_data <- reactive({ + req(run(), data(), input$yvar) + d0 <- data() |> dplyr::filter(PARAMCD == input$yvar) + vars <- categorical_vars() + if (length(vars) == 0) return(d0) + ids <- paste0("ref_", make_valid_id(vars)) + # if ref inputs not yet created, just return original + if (any(vapply(ids, function(id) is.null(input[[id]]), logical(1)))) { + return(d0) + } + refs <- purrr::map_chr( + vars, + \(v) input[[paste0("ref_", make_valid_id(v))]] + ) |> + purrr::set_names(vars) + + for (v in names(refs)) { + if (v %in% names(d0)) { + ref <- refs[[v]] + d0[[v]] <- if (is.factor(d0[[v]])) { + stats::relevel(d0[[v]], ref = ref) + } else if (is.character(d0[[v]]) || is.logical(d0[[v]])) { + lvls <- sort(unique(d0[[v]])) + stats::relevel(factor(d0[[v]], levels = lvls), ref = ref) + } else { + d0[[v]] + } + } + } + d0 + }) + + # ---- Time tick parsing ---- + parse_ticks <- function(x) { + if (is.null(x) || !nzchar(trimws(x))) return(NULL) + parts <- strsplit(x, "[,;\t\n\r ]+", perl = TRUE)[[1]] + nums <- suppressWarnings(as.numeric(parts)) + nums <- nums[!is.na(nums) & nums >= 0] + nums <- sort(unique(nums)) + if (length(nums) == 0) return(NULL) + nums + } + + user_ticks <- reactive({ + parse_ticks(input$time_ticks_raw) + }) + + observeEvent(input$time_ticks_clear, { + updateTextInput(session, "time_ticks_raw", value = "") }) - - - # create plot object using the numeric column on the yaxis - # or by filtering the data by PARAMCD, then using AVAL or CHG for the yaxis + + # modify reactive p to use km_model_data() instead of data() p <- reactive({ - req(run(), data(), input$yvar ) - #, input$resp_var,input$group,input$points,input$ci) # can't include these in req - app_km_curve(data(), - input$yvar, - input$resp_var, - input$cnsr_var, - input$group, - input$points, - input$ci - ) + req(run(), km_model_data(), input$yvar) + app_km_curve( + data = km_model_data(), + yvar = input$yvar, + response_var = input$resp_var, + censor_var = input$cnsr_var, + strata = input$group, + covariates = input$covariates, + censor_mark = input$points, + CI = input$ci, + risk_table = input$risk_table, + median_line = input$median_line, + time_ticks = user_ticks() + ) }) - + return(p) } diff --git a/R/mod_popExp_ui.R b/R/mod_popExp_ui.R index 000bfdac..669f9988 100644 --- a/R/mod_popExp_ui.R +++ b/R/mod_popExp_ui.R @@ -81,7 +81,8 @@ mod_popExp_ui <- function(id, label = "Population Explorer"){ column(width = 9, div(id = "pop_cic_plot", wellPanel( - plotlyOutput(ns("plot_output"), height = 700), + #plotlyOutput(ns("plot_output_plotly"), height = 700), + uiOutput(ns("dynamic_plot_ui")), div(style = "color: #0275d8; font-size: 12px;", htmlOutput(ns("applied_filters"))) , br(), br() ,DT::dataTableOutput(ns("plot_data")) diff --git a/R/mod_selectData.R b/R/mod_selectData.R index 815ee0a4..fc30c191 100644 --- a/R/mod_selectData.R +++ b/R/mod_selectData.R @@ -54,7 +54,7 @@ mod_selectData_server <- function(input, output, session, datafile){ sasdata <- toupper(names(datafile())) # Only select data that starts with AD followed by one or more alphanumerics or underscore - sasdata <- names(which(sapply(sasdata,function(df) { return(stringr::str_detect(toupper(df),"^AD[A-Z0-9\\_]+")) }))) + sasdata <- names(which(sapply(sasdata,function(df) { return(stringr::str_detect(toupper(df),"^AD")) }))) # Update the picker input list updatePickerInput( diff --git a/R/mod_tableGen.R b/R/mod_tableGen.R index d9be8e02..86ae4910 100644 --- a/R/mod_tableGen.R +++ b/R/mod_tableGen.R @@ -117,7 +117,7 @@ mod_tableGen_server <- function(input, output, session, datafile = reactive(NULL my_loaded_adams <- reactive({ req(!is.null(datafile())) sasdata0 <- toupper(names(datafile())) - sasdata <- names(which(sapply(sasdata0,function(df) { return(stringr::str_detect(toupper(df),"^AD[A-Z0-9\\_]+")) }))) + sasdata <- names(which(sapply(sasdata0,function(df) { return(stringr::str_detect(toupper(df),"^AD")) }))) return(sasdata) }) diff --git a/R/sysdata.rda b/R/sysdata.rda index 34771ede..70d8a4f7 100644 Binary files a/R/sysdata.rda and b/R/sysdata.rda differ diff --git a/R/utils_adam.R b/R/utils_adam.R new file mode 100644 index 00000000..c79a571e --- /dev/null +++ b/R/utils_adam.R @@ -0,0 +1,270 @@ +#' Suggest ADaM Domain +#' +#' Heuristically suggests the most likely ADaM domain for a dataset +#' based on the presence of required variables. +#' +#' @param df A data.frame to evaluate. +#' +#' @return A character string fo the most likely domain name (e.g., "ADLB"), or NULL. +#' @keywords internal +suggest_adam_domain <- function(df) { + scores <- purrr::map_int(adam_requirements, \(def) { + sum(def$required %in% names(df)) + }) + + best <- which.max(scores) + if (scores[best] > 1) { + names(adam_requirements)[best] + } else { + NULL + } +} + +#' Validate ADaM Structure +#' +#' Validates that a dataset conforms to required variables for a given ADaM domain. +#' If no domain is supplied, it will attempt to infer one based on variable names. +#' +#' @param df A data.frame to validate +#' @param domain Optional. A string naming the ADaM domain to validate against. +#' +#' @returns A list with: +#' - `domain`: inferred or provided domain +#' - `is_valid`: logical +#' - `missing_required`: character vector +#' - `missing_recommended`: character vector +#' - `error`: character or NULL +#' +#' @keywords internal +validate_adamish <- function(df, domain = NULL) { + if (is.null(domain)) { + domain <- suggest_adam_domain(df) + } + + if (is.null(domain) || !domain %in% names(adam_requirements)) { + out_list <- structure( + list( + domain = NULL, + is_valid = FALSE, + missing_required = character(0), + missing_recommended = character(0), + error = "Unknown or unspecified ADaM domain." + ), + class = "adam_validation" + ) + return(out_list) + } + + req_vars <- adam_requirements[[domain]]$required + rec_vars <- adam_requirements[[domain]]$recommended + + missing_required <- setdiff(req_vars, names(df)) + missing_recommended <- setdiff(rec_vars, names(df)) + is_valid <- length(missing_required) == 0 + + out_list <- structure( + list( + domain = domain, + is_valid = is_valid, + missing_required = missing_required, + missing_recommended = missing_recommended, + error = NULL + ), + class = "adam_validation" + ) + + return(out_list) +} + +#' Suggest Column Mappings for ADaM +#' +#' Based on validation results, attempt to suggest which columns to rename to standard ADaM variable names. +#' +#' @param df A data.frame to evaluate +#' @param validation A list returned from `validate_adamish()` +#' @param string_distance Logical. Use string distance matching to provide suggestions, requires `stringdist` package +#' @param session A Shiny session object (optional). +#' @param input_ids A named list of input IDs corresponding to ADaM variable names (optional) +#' +#' @returns A named list with best-guess mappings for missing variables +#' @keywords internal +suggest_adam_column_mapping <- function( + df, + validation, + string_distance = FALSE, + session = NULL, + input_ids = NULL +) { + if (!inherits(validation, "adam_validation")) { + stop("Invalid validation object passed. Must be from validate_adamish()") + } + + if (validation$is_valid) { + return(stats::setNames(vector("list", 0), character(0))) + } + + candidates <- names(df) + suggestions <- list() + + # Alias dictionary + aliases <- list( + USUBJID = c("subject_id", "subjid", "usrid"), + STUDYID = c("study", "study_id"), + PARAM = c("test", "variable", "paramname"), + PARAMCD = c("testcd", "param_code"), + AVAL = c("value", "avalval", "score"), + AVISIT = c("visit", "timepoint"), + AVISITN = c("visitnum", "visitn"), + CNSR = c("censor", "cnsrflag"), + ADT = c("date", "adtm", "obsdt"), + QNAM = c("question", "qname", "item"), + AEDECOD = c("event", "aeterm"), + AESTDTC = c("startdt", "aestdt", "start_date") + ) + + for (var in c(validation$missing_required, validation$missing_recommended)) { + # browser() + lc_candidates <- tolower(candidates) + lc_var <- tolower(var) + + # 1. Exact match + exact_match <- candidates[lc_candidates == lc_var] + + # 2. Alias match + alias_match <- NULL + if (var %in% names(aliases)) { + alias_match <- candidates[lc_candidates %in% tolower(aliases[[var]])] + } + + # 3. Fuzzy contains match + fuzzy_match <- candidates[grepl(lc_var, lc_candidates)] + + # 4. String distance match + stringdist_match <- NULL + + if (rlang::is_true(string_distance)) { + rlang::check_installed( + "stringdist", + reason = "is required to perform string distance matching." + ) + + # Create set of targets for expected var names and aliases + targets <- tolower(c(var, aliases[[var]] %||% character(0))) + + # Compute distances between each target and column name + dist_matrix <- stringdist::stringdistmatrix( + targets, + lc_candidates, + method = "jw" + ) + min_idx <- which(dist_matrix == min(dist_matrix), arr.ind = TRUE) + + # Get best column candidate if distance is small enough + if (nrow(min_idx) > 0) { + min_val <- dist_matrix[min_idx[1, 1], min_idx[1, 2]] + if (min_val < 0.25) { + stringdist_match <- candidates[min_idx[1, 2]] + } + } + } + + # 5. Select suggestion + suggestion <- dplyr::first( + c(exact_match, alias_match, fuzzy_match, stringdist_match), + default = NULL + ) + suggestions[[var]] <- suggestion + + # If session + input_ids provided, update selectizeInput() + if ( + !rlang::is_null(session) && + !rlang::is_null(input_ids) && + !rlang::is_null(input_ids[[var]]) && + !rlang::is_null(suggestion) + ) { + shiny::updateSelectizeInput( + session = session, + inputId = input_ids[[var]], + choices = candidates, + selected = suggestion + ) + } + } + + return(suggestions) +} + + +#' Show ADaM Compatibility Alert +#' +#' Display a shinyalert-style popup based on the results of `validate_adamish()` +#' +#' @param validation A list returned from `validate_adamish()` +#' @param session The Shiny session (typically `session` from server) +#' @keywords internal +show_adamish_alert <- function(validation, session) { + rlang::check_installed("shinyalert", reason = "to use this function.") + + if (isTRUE(validation$is_valid)) { + shinyalert::shinyalert( + title = "\u2705 ADaM Compatibility Passed", + text = glue::glue("Domain: {validation$domain}"), + type = "success", + session = session + ) + } else { + message <- if (!is.null(validation$error)) { + validation$error + } else { + domain_msg <- glue::glue("Domain: {validation$domain}") + + req_msg <- glue::glue( + "\u274C Missing required: {glue::glue_collapse(validation$missing_required, sep = ', ')}" + ) + rec_msg <- glue::glue( + "\u26A0\uFE0F Missing recommended: {glue::glue_collapse(validation$missing_recommended, sep = ', ')}" + ) + + message <- dplyr::if_else( + length(validation$missing_recommended) > 0, + glue::glue("{domain_msg}\n{req_msg}\n{rec_msg}"), + req_msg + ) + } + + shinyalert::shinyalert( + title = "\u274C ADaM Compatibility Failed", + text = message, + type = "error", + session = session + ) + } +} + +#' Normalize ADaM datasets +#' +#' @description Checks ADaM domain of uploaded datasets and renames based on the domain. Returns filename if no ADaM domain. +#' +#' @param datafile_list list A list of data.frames dataset to normalize +#' @return A list of normalized data.frames. +#' +#' @noRd +#' +normalize_adam_datasets <- function(datafile_list) { + normalized_list <- list() + + for (name in names(datafile_list)) { + df <- datafile_list[[name]] + validation <- validate_adamish(df) + + if (!is.null(validation$domain)) { + # Rename to standard domain name + normalized_list[[validation$domain]] <- df + } else { + # Keep original name if can't validate + normalized_list[[name]] <- df + } + } + + return(normalized_list) +} diff --git a/R/utils_helpers.R b/R/utils_helpers.R index 76d052b9..aee3fb0d 100644 --- a/R/utils_helpers.R +++ b/R/utils_helpers.R @@ -1,34 +1,38 @@ #' GT Column Names -#' +#' #' @param col_names A vector of column names #' @param col_total A vector of column totals -#' +#' #' @description The function creates the labels for each column using the total function so the columns are now NAME N= X #' @export #' @keywords tabGen_repro -#' +#' #' @return A character object of class \code{from_markdown}. -#' +#' #' @importFrom purrr map2 #' @importFrom gt md #' @importFrom glue glue #' @importFrom rlang set_names -#' -#' @examples +#' +#' @examples #' data(example_dat2, package = "tidyCDISC") -#' +#' #' labels <- col_for_list_expr(example_dat2$col_names, example_dat2$col_totals) #' labels -#' +#' #' if (interactive()) { #' # TG table without nice column labels or totals #' example_dat2$TG_table -#' +#' #' # TG table with nice column labels and totals #' gt::cols_label(example_dat2$TG_table, .list = labels) #' } col_for_list_expr <- function(col_names, col_total) { - purrr::map2(col_names, col_total, ~ gt::md(glue::glue("**{.x}**
N={.y}"))) %>% + purrr::map2( + col_names, + col_total, + ~ gt::md(glue::glue("**{.x}**
N={.y}")) + ) %>% rlang::set_names(col_names) } @@ -43,14 +47,14 @@ col_for_list_expr <- function(col_names, col_total) { #' #' @family indvExp Functions #' @noRd -#' +#' my_gg_color_hue <- function(n) { - hues = seq(15, 375, length = n +1) + hues = seq(15, 375, length = n + 1) hcl(h = hues, l = 65, c = 100)[1:n] } #' Standard Error Calculation -#' +#' #' Calculates the square root of variance divided by n #' #' @param x A numeric vector @@ -60,78 +64,84 @@ my_gg_color_hue <- function(n) { #' #' @family tableGen Functions #' @noRd -#' -std_err <- function(x, na.rm=FALSE) { - if (na.rm) x <- na.omit(x) - sqrt(var(x)/length(x)) +#' +std_err <- function(x, na.rm = FALSE) { + if (na.rm) { + x <- na.omit(x) + } + sqrt(var(x) / length(x)) } #' Translate the position of into a integer needed for ggplot2 #' @param dir the strings to capitalize #' @noRd -#' -translate_pos <- function(dir){ - if(dir %in% c("left","bottom")) -1 - else if(dir %in% c("right","top")) 1 - else 0 # middle +#' +translate_pos <- function(dir) { + if (dir %in% c("left", "bottom")) { + -1 + } else if (dir %in% c("right", "top")) { + 1 + } else { + 0 + } # middle } #' Capitalize the first letter of a string #' @param y the strings to capitalize #' @noRd -#' +#' CapStr <- function(y) { c <- strsplit(y, " ")[[1]] - paste(toupper(substring(c, 1,1)), substring(c, 2), - sep="", collapse=" ") + paste(toupper(substring(c, 1, 1)), substring(c, 2), sep = "", collapse = " ") } -#' transpose dataframes so they can all +#' transpose dataframes so they can all #' be used with rbind to generate #' the gt tables -#' +#' #' @param df the dataframe to transpose #' @param num the number of rows to return #' @importFrom dplyr mutate rename #' @importFrom tidyr pivot_longer pivot_wider #' @noRd -#' +#' transpose_df <- function(df, num) { t_df <- df %>% dplyr::mutate("rowname" = rownames(.), .before = 1) %>% tidyr::pivot_longer(-"rowname") %>% tidyr::pivot_wider(names_from = "rowname") %>% dplyr::rename("rowname" = "name") - return(t_df[-num,]) + return(t_df[-num, ]) } #' Identify Names of Columns -#' +#' #' @description A function to transform the \code{gt} row names from generics to the column name and the total N of #' each column #' #' @param data the data to create columns with #' @param group whether to group the data to calculate Ns -#' +#' #' @export #' @keywords tabGen_repro -#' +#' #' @return A character vector -#' -#' @examples +#' +#' @examples #' data(adsl, package = "tidyCDISC") -#' +#' #' # Values of TRT01P #' unique(adsl$TRT01P) -#' +#' #' # Common row names based on TRT01P #' common_rownames(adsl, "TRT01P") -common_rownames <- function(data, group) { - if (is.null(group) ) { #| group == "NONE" +common_rownames <- function(data, group) { + if (is.null(group)) { + #| group == "NONE" vars <- c("Variable", "Total") } else { - if(is.factor(data[[group]])){ + if (is.factor(data[[group]])) { # droplevels() get's rid of levels that no longer exist in the data post filtering lvls <- levels(data[[group]]) # removed droplevels() to retain all trt grps } else { @@ -165,8 +175,6 @@ common_rownames <- function(data, group) { # # if (x == "ADAE") ae_data() else all_data() # # } - - #' Convert actions performed on from an IDEAFilter output dataframe into text #' #' Function accepts a filtered data object from IDEAFilter (shiny_data_filter @@ -186,53 +194,82 @@ common_rownames <- function(data, group) { #' @importFrom utils capture.output #' @importFrom tidyr as_tibble #' @importFrom shiny HTML -#' +#' #' @return An HTML string #' @noRd -#' -filters_in_english <- function(filtered_data, filter_header = "Filters Applied:"){ - +#' +filters_in_english <- function( + filtered_data, + filter_header = "Filters Applied:" +) { # grab the output - orig_code <- paste(utils::capture.output(attr(filtered_data, "code")),collapse = "") + orig_code <- paste( + utils::capture.output(attr(filtered_data, "code")), + collapse = "" + ) # orig_code <- 'processed_data %>% filter(ABIFN1 %in% c(NA, "NEGATIVE")) %>% filter(ABIFN1 %in% c(NA, "POSITIVE"))' # convert double quotes to single quotes code_text <- orig_code %>% stringr::str_remove("^.*?\\%>\\%") %>% stringr::str_replace_all('\"', "\'") - + # find the character position for the end of the string len <- nchar(code_text) - + # find the start of the variable expressions using position of "filter" - f_loc <- str_locate_all(code_text,"filter\\(") + f_loc <- str_locate_all(code_text, "filter\\(") filter_loc <- tidyr::as_tibble(f_loc[[1]]) var_st <- filter_loc$end + 1 - + # find the end of variable expression susing position of "%>%" - p_loc <- str_locate_all(code_text,"\\%\\>\\%") # have to use this + p_loc <- str_locate_all(code_text, "\\%\\>\\%") # have to use this pipe_loc <- tidyr::as_tibble(p_loc[[1]]) num_pipes <- nrow(pipe_loc) - var_end <- c(pipe_loc$start[ifelse(num_pipes == 1, 1, 2):num_pipes] - 3, len - 1) # ifelse(num_pipes == 1, 1, 2) - + var_end <- c( + pipe_loc$start[ifelse(num_pipes == 1, 1, 2):num_pipes] - 3, + len - 1 + ) # ifelse(num_pipes == 1, 1, 2) + # use map2, to apply multiple arguments to the substr function, returing a list - filter_vectors <- map2(.x = var_st, .y = var_end, function(x,y) substr(code_text,x,y)) + filter_vectors <- map2(.x = var_st, .y = var_end, function(x, y) { + substr(code_text, x, y) + }) my_msgs <- filter_vectors[!(is.na(filter_vectors) | filter_vectors == "")] # get rid of NA msgs - + # clean up messages to read more naturally - disp_msg <- gsub("\\%in\\%","IN", - gsub("c\\(","\\(", - gsub("\\(NA","\\(Missing", - gsub(".na",".Missing", - gsub(" "," ", # 3 spaces - gsub(" "," ", # 2 spaces - gsub("\\|","OR", - gsub("\\&","AND", - my_msgs - )))))))) - + disp_msg <- gsub( + "\\%in\\%", + "IN", + gsub( + "c\\(", + "\\(", + gsub( + "\\(NA", + "\\(Missing", + gsub( + ".na", + ".Missing", + gsub( + " ", + " ", # 3 spaces + gsub( + " ", + " ", # 2 spaces + gsub("\\|", "OR", gsub("\\&", "AND", my_msgs)) + ) + ) + ) + ) + ) + ) + # format as html in a specific format, with indentation - return(HTML(paste0("",filter_header,"
    " - ,paste(disp_msg, collapse = "
    ")))) + return(HTML(paste0( + "", + filter_header, + "
    ", + paste(disp_msg, collapse = "
    ") + ))) } #' Get Factor Levels @@ -240,29 +277,30 @@ filters_in_english <- function(filtered_data, filter_header = "Filters Applied:" #' Extracts the factor levels of a vector or returns the unique values if the vector is not a factor. #' #' @param x a vector -#' -#' @return x vector -#' +#' +#' @return x vector +#' #' @export #' @keywords helpers -#' +#' #' @references A character vector containing the levels of the factor/vector -#' -#' @examples +#' +#' @examples #' data(adae, package = "tidyCDISC") -#' +#' #' # Create levels based on VARN #' varN_fctr_adae <- varN_fctr_reorder(adae) -#' +#' #' # `adae` does not have factor but `varN_fctr_adae` does #' levels(adae$RACE) #' levels(varN_fctr_adae$RACE) -#' +#' #' # `get_levels()` either creates the factor or retrieves it #' get_levels(adae$RACE) #' get_levels(varN_fctr_adae$RACE) -get_levels <- function(x) {if(is.factor(x)) levels(x) else sort(unique(x), na.last = TRUE) } - +get_levels <- function(x) { + if (is.factor(x)) levels(x) else sort(unique(x), na.last = TRUE) +} #' %quote% @@ -271,41 +309,40 @@ get_levels <- function(x) {if(is.factor(x)) levels(x) else sort(unique(x), na.la #' @return either y or a string #' @noRd #' -`%quote%` <- function(x,y) { +`%quote%` <- function(x, y) { if (is.null(x)) { y } else { - paste0("\'",x,"\'") #sQuote(x) # old + paste0("\'", x, "\'") #sQuote(x) # old } } - #' Re-order Factor Levels by VARN -#' +#' #' Function to that looks for VARN counterparts to any character or factor VAR #' variables in any dataframe and re-orders there factor levels, taking the lead #' from VARN's numeric guide. -#' +#' #' @param data a dataframe, including one enriched with SAS labels attributes -#' +#' #' @importFrom sjlabelled get_label set_label -#' @importFrom purrr walk2 -#' +#' @importFrom purrr walk2 +#' #' @export #' @keywords helpers -#' +#' #' @return The data frame after having factor levels re-ordered by VARN -#' -#' @examples +#' +#' @examples #' data(adae, package = "tidyCDISC") -#' +#' #' varN_fctr_adae <- varN_fctr_reorder(adae) -#' +#' #' unique(adae[,c("AGEGR1", "AGEGR1N")]) #' levels(adae$AGEGR1) #' levels(varN_fctr_adae$AGEGR1) -#' +#' #' unique(adae[,c("RACE", "RACEN")]) #' levels(adae$RACE) #' levels(varN_fctr_adae$RACE) @@ -315,24 +352,34 @@ varN_fctr_reorder <- function(data) { # Now to refactor levels in VARN order, if they exist: # save the variable labels into savelbls vector savelbls <- sjlabelled::get_label(data) - + # identify all char - numeric variables pairs that need factor re-ordering cols <- colnames(data) - non_num_cols <- c(subset_colclasses(data, is.factor), - subset_colclasses(data, is.character)) - varn <- paste0(non_num_cols,"N")[paste0(non_num_cols,"N") %in% cols] - varc <- substr(varn,1,nchar(varn) - 1) - - if(!rlang::is_empty(varn)){ - for(i in 1:length(varn)){ + non_num_cols <- c( + subset_colclasses(data, is.factor), + subset_colclasses(data, is.character) + ) + varn <- paste0(non_num_cols, "N")[paste0(non_num_cols, "N") %in% cols] + varc <- substr(varn, 1, nchar(varn) - 1) + + if (!rlang::is_empty(varn)) { + for (i in 1:length(varn)) { this_varn <- as.character(varn[i]) this_varc <- varc[i] this_varn_sym <- rlang::sym(this_varn) - this_varc_sym <-rlang::sym(this_varc) - pref_ord <- data %>% select(one_of(this_varc, this_varn)) %>% distinct() %>% arrange(!!this_varn_sym) + this_varc_sym <- rlang::sym(this_varc) + pref_ord <- data %>% + select(one_of(this_varc, this_varn)) %>% + distinct() %>% + arrange(!!this_varn_sym) data <- - data %>% mutate(!!this_varc_sym := factor(!!this_varc_sym, - levels = unique(pref_ord[[this_varc]]))) + data %>% + mutate( + !!this_varc_sym := factor( + !!this_varc_sym, + levels = unique(pref_ord[[this_varc]]) + ) + ) # return(data) } } @@ -346,15 +393,18 @@ error_handler <- function(e) { UseMethod("error_handler") } +#' @export error_handler.default <- function(e) { conditionMessage(e) } +#' @export error_handler.purrr_error_indexed <- `error_handler.dplyr:::mutate_error` <- function(e) { - e$parent$message -} + e$parent$message + } +#' @export error_handler.rlang_error <- function(e) { stringr::str_replace_all(rlang::cnd_message(e), "\n.*? ", " ") } @@ -367,7 +417,7 @@ error_handler.rlang_error <- function(e) { #' @param data a data.frame, hopefully containing variable label attributes #' @param var_str you guessed it, the name of a variable inside of `data`, in #' the form of a string -#' +#' #' @return a string containing a useful label #' #' @noRd @@ -375,8 +425,9 @@ best_lab <- function(data, var_str) { attr(data[[var_str]], "label") %||% var_str } - - - - - +#' Dummy function to remove note from R CMD check +#' @noRd +dummy <- function() { + pkgload::check_dep_version + cli::cli_abort +} diff --git a/R/utils_read_data.R b/R/utils_read_data.R new file mode 100644 index 00000000..96a6dc83 --- /dev/null +++ b/R/utils_read_data.R @@ -0,0 +1,59 @@ +#' Reads datasets in various formats +#' +#' @description Imports data in various formats and cleans column names. Accommodates .txt, .csv, .xls, .xlsx, .sas7bdat +#' +#' @param path Character Path to a tabular dataset in .txt, .csv, .xls, .xlsx, or .sas7bdat format +#' @return A data.frame of the imported dataset. +#' +#' @noRd +#' +read_data <- function(path) { + ext <- fs::path_ext(path) + + data1 <- switch( + ext, + txt = vroom::vroom(path) |> as.data.frame() |> coerce_ids_to_char(), + csv = vroom::vroom(path, delim = ",") |> + as.data.frame() |> + coerce_ids_to_char(), + xls = readxl::read_xls(path) |> as.data.frame() |> coerce_ids_to_char(), + xlsx = readxl::read_xlsx(path) |> as.data.frame() |> coerce_ids_to_char(), + sas7bdat = haven::read_sas(path) |> + haven::zap_formats() |> + coerce_ids_to_char(), + parquet = arrow::read_parquet(path) |> coerce_ids_to_char(), + stop("Unsupported file format") + ) + + return(data1) +} + +#' Converts known ID variables to characters +#' +#' @description Certain file formats have no column type metadata. This function converts known ID variables to character. +#' +#' @param data data.frame A dataset to transform +#' @return A data.frame of the modified dataset. +#' +#' @noRd +#' +coerce_ids_to_char <- function(data) { + data |> + dplyr::mutate( + dplyr::across( + .cols = tidyselect::matches( + "STUDYID|USUBJID|SUBJID|SITEID", + ignore.case = TRUE + ), + .fns = \(x) as.character(x) + ) + ) +} + +#' Dummy function to remove note from R CMD check +#' @noRd +dummy <- function() { + broom.helpers::model_get_assign + pkgload::check_dep_version +} + diff --git a/_pkgdown.yml b/_pkgdown.yml index 3f05bcb2..4bd221db 100644 --- a/_pkgdown.yml +++ b/_pkgdown.yml @@ -2,11 +2,14 @@ articles: - title: Getting Started contents: - tidyCDISC + - getting_started - title: Blog Posts navbar: ~ desc: News and Announcements contents: - Blog + - announcing-tidycdisc-0-0-1-1 + - announcing-tidycdisc-0-2-1 - title: User Guides navbar: User Guides desc: Step-by-step tutorials for each module in the application diff --git a/data-raw/internal-data.R b/data-raw/internal-data.R index ff2efab0..07739e88 100644 --- a/data-raw/internal-data.R +++ b/data-raw/internal-data.R @@ -1,34 +1,96 @@ pretty_blocks <- tidyr::tibble( - Pattern = c("MEAN", "FREQ", "CHG", "Y_FREQ", "MAX_FREQ", "NON_MISSING", - "NESTED_FREQ_DSC", "NESTED_FREQ_ABC"), - Replacement = c("Descriptive Statistics", - "Summary Counts", - "Descriptive Statistics of Change from Baseline", - "Subject Count for those with 'Y' values", - "Subject Count for maximum", - "Subject Count for those with Non Missing values", - "Subject Count at each variable level, sorted descending by total counts", - "Subject Count at each variable level, sorted alphabetically by name") + Pattern = c( + "MEAN", + "FREQ", + "CHG", + "Y_FREQ", + "MAX_FREQ", + "NON_MISSING", + "NESTED_FREQ_DSC", + "NESTED_FREQ_ABC" + ), + Replacement = c( + "Descriptive Statistics", + "Summary Counts", + "Descriptive Statistics of Change from Baseline", + "Subject Count for those with 'Y' values", + "Subject Count for maximum", + "Subject Count for those with Non Missing values", + "Subject Count at each variable level, sorted descending by total counts", + "Subject Count at each variable level, sorted alphabetically by name" + ) ) tg_data <- tidyr::tibble( USUBJID = 1:10, - AGE = c(20,30,40,30,40,60,20,30,50,40), + AGE = c(20, 30, 40, 30, 40, 60, 20, 30, 50, 40), PARAMCD = "DIABP", PARAM = "Diastolic", SEX = c(rep("F", 5), rep("M", 5)), COUNTRY = c(rep(c("Canada", "USA"), 5)), AVISIT = c(rep(c("Week 1", "Week 2"), 5)), - AVISITN = c(rep(c(1,2), 5)), - AVAL = c(20,30,40,30,40,60,20,30,50,40), - CHG = c(20,30,40,30,40,60,20,30,50,40), - ITTFL = c('Y','Y',rep(NA_character_,8)), - SAFFL = c('Y','Y','N',rep(NA_character_,7)), - DTHDT = c(as.Date("2020-01-01"),rep(NA,9)), - AVISITf1 = factor(c(rep(c("Week 1", "Week 2"), 5)),c("Week 1","Week 2")), - AVISITf2 = factor(c(rep(c("Week 1", "Week 2"), 5)),c("Week 2","Week 1")), + AVISITN = c(rep(c(1, 2), 5)), + AVAL = c(20, 30, 40, 30, 40, 60, 20, 30, 50, 40), + CHG = c(20, 30, 40, 30, 40, 60, 20, 30, 50, 40), + ITTFL = c('Y', 'Y', rep(NA_character_, 8)), + SAFFL = c('Y', 'Y', 'N', rep(NA_character_, 7)), + DTHDT = c(as.Date("2020-01-01"), rep(NA, 9)), + AVISITf1 = factor(c(rep(c("Week 1", "Week 2"), 5)), c("Week 1", "Week 2")), + AVISITf2 = factor(c(rep(c("Week 1", "Week 2"), 5)), c("Week 2", "Week 1")), AVISITf2N = AVISITN ) -usethis::use_data(pretty_blocks, tg_data, internal = TRUE, overwrite = TRUE) +# #' ADaM domain variable requirements +# #' +# #' This internal object defines required and recommended variables for common ADaM datasets. +# #' Used by `suggest_adam_domain()` and `validate_adamish()`. +# #' @keywords internal +# "adam_requirements" + +adam_requirements <- list( + ADSL = list( + required = c("STUDYID", "USUBJID"), + recommended = c("AGE", "SEX", "RACE", "ARM", "TRT01P") + ), + ADLB = list( + required = c("STUDYID", "USUBJID", "PARAM", "PARAMCD", "AVAL", "AVISIT"), + recommended = c("AVISITN", "DTYPE", "ABLFL", "ADTM") + ), + ADVS = list( + required = c("STUDYID", "USUBJID", "PARAM", "PARAMCD", "AVAL", "AVISIT"), + recommended = c("AVISITN", "ADY", "DTYPE") + ), + ADQS = list( + required = c("STUDYID", "USUBJID", "PARAM", "PARAMCD", "AVAL", "AVISIT"), + recommended = c("AVISITN", "ADY") + ), + ADAE = list( + required = c("STUDYID", "USUBJID", "AEDECOD", "AESTDTC"), + recommended = c("AESER", "AESEV", "AEACN", "AEOUT") + ), + ADEG = list( + required = c("STUDYID", "USUBJID", "PARAM", "PARAMCD", "AVAL", "AVISIT"), + recommended = c("AVISITN", "ADTM") + ), + ADTTE = list( + required = c( + "STUDYID", + "USUBJID", + "PARAMCD", + "PARAM", + "AVAL", + "CNSR", + "ADT" + ), + recommended = c("STARTDT", "ADTM", "AVISIT") + ) +) + +usethis::use_data( + pretty_blocks, + tg_data, + adam_requirements, + internal = TRUE, + overwrite = TRUE +) diff --git a/dev/03_deploy.R b/dev/03_deploy.R index 4e36df69..5be9d88a 100644 --- a/dev/03_deploy.R +++ b/dev/03_deploy.R @@ -1,12 +1,12 @@ # Building a Prod-Ready, Robust Shiny Application. -# -# README: each step of the dev files is optional, and you don't have to -# fill every dev scripts before getting started. -# 01_start.R should be filled at start. +# +# README: each step of the dev files is optional, and you don't have to +# fill every dev scripts before getting started. +# 01_start.R should be filled at start. # 02_dev.R should be used to keep track of your development during the project. # 03_deploy.R should be used once you need to deploy your app. -# -# +# +# ###################################### #### CURRENT FILE: DEPLOY SCRIPT ##### ###################################### @@ -35,3 +35,5 @@ golem::add_dockerfile_shinyproxy() ## If you want to deploy to Heroku golem::add_dockerfile_heroku() + +rsconnect::writeManifest() diff --git a/dev/adam_requirements.R b/dev/adam_requirements.R new file mode 100644 index 00000000..877f7d4e --- /dev/null +++ b/dev/adam_requirements.R @@ -0,0 +1,47 @@ +# #' ADaM domain variable requirements +# #' +# #' This internal object defines required and recommended variables for common ADaM datasets. +# #' Used by `suggest_adam_domain()` and `validate_adamish()`. +# #' @keywords internal +# "adam_requirements" + +adam_requirements <- list( + ADSL = list( + required = c("STUDYID", "USUBJID"), + recommended = c("AGE", "SEX", "RACE", "ARM", "TRT01P") + ), + ADLB = list( + required = c("STUDYID", "USUBJID", "PARAM", "PARAMCD", "AVAL", "AVISIT"), + recommended = c("AVISITN", "DTYPE", "ABLFL", "ADTM") + ), + ADVS = list( + required = c("STUDYID", "USUBJID", "PARAM", "PARAMCD", "AVAL", "AVISIT"), + recommended = c("AVISITN", "ADY", "DTYPE") + ), + ADQS = list( + required = c("STUDYID", "USUBJID", "PARAM", "PARAMCD", "AVAL", "AVISIT"), + recommended = c("AVISITN", "ADY") + ), + ADAE = list( + required = c("STUDYID", "USUBJID", "AEDECOD", "AESTDTC"), + recommended = c("AESER", "AESEV", "AEACN", "AEOUT") + ), + ADEG = list( + required = c("STUDYID", "USUBJID", "PARAM", "PARAMCD", "AVAL", "AVISIT"), + recommended = c("AVISITN", "ADTM") + ), + ADTTE = list( + required = c( + "STUDYID", + "USUBJID", + "PARAMCD", + "PARAM", + "AVAL", + "CNSR", + "ADT" + ), + recommended = c("STARTDT", "ADTM", "AVISIT") + ) +) + +usethis::use_data(adam_requirements, internal = TRUE, overwrite = TRUE) \ No newline at end of file diff --git a/dev/renv_setup.R b/dev/renv_setup.R new file mode 100644 index 00000000..7b991faa --- /dev/null +++ b/dev/renv_setup.R @@ -0,0 +1,37 @@ +# Fix renv +Sys.setenv(RENV_CONFIG_PAK_ENABLED = TRUE) +Sys.setenv(RENV_CONFIG_PPM_ENABLED = TRUE) + +Sys.setenv(RENV_CONFIG_PAK_ENABLED = FALSE) +Sys.setenv(RENV_CONFIG_PPM_ENABLED = FALSE) + +renv::init() +renv::update() +#pak::pak("usethis") +usethis::use_package("ggsurvfit") +#utils::install.packages("https://packagemanager.posit.co/cran/latest/bin/windows/contrib/4.4/jsonlite_2.0.0.zip") +#utils::install.packages("https://packagemanager.posit.co/cran/latest/bin/windows/contrib/4.4/httpuv_1.6.16.zip") +#utils::install.packages("https://packagemanager.posit.co/cran/latest/bin/windows/contrib/4.4/ggsurvfit_1.1.0.zip") +#utils::install.packages("https://packagemanager.posit.co/cran/latest/bin/windows/contrib/4.4/ggplot2_3.5.2.zip") +pak::pak("devtools") +usethis::use_package("devtools", type = "Suggests") +usethis::use_package("arrow") +usethis::use_package("readxl") +usethis::use_package("cli") +usethis::use_package("fs") +usethis::use_package("data.table") +usethis::use_package("gtsummary") +usethis::use_package("broom.helpers") +usethis::use_package("vroom") +usethis::use_package("tidyselect") +# usethis::use_package("arcusTStidy") +usethis::use_package("tibble") +usethis::use_package("stringdist") + + +renv::snapshot(type = "explicit") + +renv::install("pkgload") +renv::restore() + +rsconnect::writeManifest(appMode = "shiny") diff --git a/dev/run_dev.R b/dev/run_dev.R index c8767797..efcd6907 100644 --- a/dev/run_dev.R +++ b/dev/run_dev.R @@ -1,5 +1,9 @@ # Sass code compilation -sass::sass(input = sass::sass_file("inst/app/www/timevis.sass"), output = "inst/app/www/timevis.css", cache = NULL) +sass::sass( + input = sass::sass_file("inst/app/www/timevis.sass"), + output = "inst/app/www/timevis.css", + cache = NULL +) # Set options here options(golem.app.prod = FALSE) # TRUE = production mode, FALSE = development mode @@ -12,11 +16,16 @@ golem::detach_all_attached() # Document and reload your package, which runs these three functions... golem::document_and_reload() -# Run the application -run_app() +# Run the application +run_app(launch.browser = TRUE) # # turn off any options # options(shiny.autoload.r=NULL) - - +# options(shiny.logLevel = "trace") +# Profile +# profvis::profvis({ +# print( +# run_app(launch.browser = TRUE) +# ) +# }) diff --git a/inst/WORDLIST b/inst/WORDLIST index 62b34a48..f41f1073 100644 --- a/inst/WORDLIST +++ b/inst/WORDLIST @@ -54,6 +54,7 @@ VARN VARN's YYYY adae +adamish adlbc adsl adtte @@ -65,6 +66,7 @@ boxPlot callModule checkGroup checkboxInput +csv dev df draggable @@ -75,7 +77,9 @@ dropzone eventtype expr fluidRow +fo ggplot +ggsurvfit gitHub github grey @@ -96,6 +100,7 @@ pharma pharmaverse phuse pkgs +plotly png pre px @@ -105,9 +110,11 @@ riskmetric sas selectInput selectable +shinyalert shinyapps snagit stan +stringdist submodule tableGen tibble @@ -117,6 +124,9 @@ to’s ui un vline +wordlist www +xls +xlsx xpt ’s diff --git a/man/show_adamish_alert.Rd b/man/show_adamish_alert.Rd new file mode 100644 index 00000000..c2a5c375 --- /dev/null +++ b/man/show_adamish_alert.Rd @@ -0,0 +1,17 @@ +% Generated by roxygen2: do not edit by hand +% Please edit documentation in R/utils_adam.R +\name{show_adamish_alert} +\alias{show_adamish_alert} +\title{Show ADaM Compatibility Alert} +\usage{ +show_adamish_alert(validation, session) +} +\arguments{ +\item{validation}{A list returned from `validate_adamish()`} + +\item{session}{The Shiny session (typically `session` from server)} +} +\description{ +Display a shinyalert-style popup based on the results of `validate_adamish()` +} +\keyword{internal} diff --git a/man/suggest_adam_column_mapping.Rd b/man/suggest_adam_column_mapping.Rd new file mode 100644 index 00000000..5cb71afd --- /dev/null +++ b/man/suggest_adam_column_mapping.Rd @@ -0,0 +1,32 @@ +% Generated by roxygen2: do not edit by hand +% Please edit documentation in R/utils_adam.R +\name{suggest_adam_column_mapping} +\alias{suggest_adam_column_mapping} +\title{Suggest Column Mappings for ADaM} +\usage{ +suggest_adam_column_mapping( + df, + validation, + string_distance = FALSE, + session = NULL, + input_ids = NULL +) +} +\arguments{ +\item{df}{A data.frame to evaluate} + +\item{validation}{A list returned from `validate_adamish()`} + +\item{string_distance}{Logical. Use string distance matching to provide suggestions, requires `stringdist` package} + +\item{session}{A Shiny session object (optional).} + +\item{input_ids}{A named list of input IDs corresponding to ADaM variable names (optional)} +} +\value{ +A named list with best-guess mappings for missing variables +} +\description{ +Based on validation results, attempt to suggest which columns to rename to standard ADaM variable names. +} +\keyword{internal} diff --git a/man/suggest_adam_domain.Rd b/man/suggest_adam_domain.Rd new file mode 100644 index 00000000..f84c849d --- /dev/null +++ b/man/suggest_adam_domain.Rd @@ -0,0 +1,19 @@ +% Generated by roxygen2: do not edit by hand +% Please edit documentation in R/utils_adam.R +\name{suggest_adam_domain} +\alias{suggest_adam_domain} +\title{Suggest ADaM Domain} +\usage{ +suggest_adam_domain(df) +} +\arguments{ +\item{df}{A data.frame to evaluate.} +} +\value{ +A character string fo the most likely domain name (e.g., "ADLB"), or NULL. +} +\description{ +Heuristically suggests the most likely ADaM domain for a dataset +based on the presence of required variables. +} +\keyword{internal} diff --git a/man/validate_adamish.Rd b/man/validate_adamish.Rd new file mode 100644 index 00000000..a4476ef3 --- /dev/null +++ b/man/validate_adamish.Rd @@ -0,0 +1,26 @@ +% Generated by roxygen2: do not edit by hand +% Please edit documentation in R/utils_adam.R +\name{validate_adamish} +\alias{validate_adamish} +\title{Validate ADaM Structure} +\usage{ +validate_adamish(df, domain = NULL) +} +\arguments{ +\item{df}{A data.frame to validate} + +\item{domain}{Optional. A string naming the ADaM domain to validate against.} +} +\value{ +A list with: +- `domain`: inferred or provided domain +- `is_valid`: logical +- `missing_required`: character vector +- `missing_recommended`: character vector +- `error`: character or NULL +} +\description{ +Validates that a dataset conforms to required variables for a given ADaM domain. +If no domain is supplied, it will attempt to infer one based on variable names. +} +\keyword{internal} diff --git a/manifest.json b/manifest.json new file mode 100644 index 00000000..a6782d62 --- /dev/null +++ b/manifest.json @@ -0,0 +1,6135 @@ +{ + "version": 1, + "locale": "en_US", + "platform": "4.4.0", + "metadata": { + "appmode": "shiny", + "primary_rmd": null, + "primary_html": null, + "content_category": null, + "has_parameters": false + }, + "environment": { + "r": { + "requires": ">= 4.1" + } + }, + "packages": { + "DT": { + "Source": "CRAN", + "Repository": "https://packagemanager.posit.co/cran/latest", + "description": { + "Package": "DT", + "Type": "Package", + "Title": "A Wrapper of the JavaScript Library 'DataTables'", + "Version": "0.33", + "Authors@R": "c(\n person(\"Yihui\", \"Xie\", role = \"aut\"),\n person(\"Joe\", \"Cheng\", email = \"joe@posit.co\", role = c(\"aut\", \"cre\")),\n person(\"Xianying\", \"Tan\", role = \"aut\"),\n person(\"JJ\", \"Allaire\", role = \"ctb\"),\n person(\"Maximilian\", \"Girlich\", role = \"ctb\"),\n person(\"Greg\", \"Freedman Ellis\", role = \"ctb\"),\n person(\"Johannes\", \"Rauh\", role = \"ctb\"),\n person(\"SpryMedia Limited\", role = c(\"ctb\", \"cph\"), comment = \"DataTables in htmlwidgets/lib\"),\n person(\"Brian\", \"Reavis\", role = c(\"ctb\", \"cph\"), comment = \"selectize.js in htmlwidgets/lib\"),\n person(\"Leon\", \"Gersen\", role = c(\"ctb\", \"cph\"), comment = \"noUiSlider in htmlwidgets/lib\"),\n person(\"Bartek\", \"Szopka\", role = c(\"ctb\", \"cph\"), comment = \"jquery.highlight.js in htmlwidgets/lib\"),\n person(\"Alex\", \"Pickering\", role = c(\"ctb\")),\n person(\"William\", \"Holmes\", role = c(\"ctb\")),\n person(\"Mikko\", \"Marttila\", role = c(\"ctb\")),\n person(\"Andres\", \"Quintero\", role = c(\"ctb\")),\n person(\"Stéphane\", \"Laurent\", role = c(\"ctb\")),\n person(given = \"Posit Software, PBC\", role = c(\"cph\", \"fnd\"))\n )", + "Description": "Data objects in R can be rendered as HTML tables using the\n JavaScript library 'DataTables' (typically via R Markdown or Shiny). The\n 'DataTables' library has been included in this R package. The package name\n 'DT' is an abbreviation of 'DataTables'.", + "URL": "https://github.com/rstudio/DT", + "BugReports": "https://github.com/rstudio/DT/issues", + "License": "GPL-3 | file LICENSE", + "Imports": "htmltools (>= 0.3.6), htmlwidgets (>= 1.3), httpuv, jsonlite\n(>= 0.9.16), magrittr, crosstalk, jquerylib, promises", + "Suggests": "knitr (>= 1.8), rmarkdown, shiny (>= 1.6), bslib, future,\ntestit, tibble", + "VignetteBuilder": "knitr", + "RoxygenNote": "7.3.1", + "Encoding": "UTF-8", + "NeedsCompilation": "no", + "Packaged": "2024-04-03 14:36:50 UTC; yihui", + "Author": "Yihui Xie [aut],\n Joe Cheng [aut, cre],\n Xianying Tan [aut],\n JJ Allaire [ctb],\n Maximilian Girlich [ctb],\n Greg Freedman Ellis [ctb],\n Johannes Rauh [ctb],\n SpryMedia Limited [ctb, cph] (DataTables in htmlwidgets/lib),\n Brian Reavis [ctb, cph] (selectize.js in htmlwidgets/lib),\n Leon Gersen [ctb, cph] (noUiSlider in htmlwidgets/lib),\n Bartek Szopka [ctb, cph] (jquery.highlight.js in htmlwidgets/lib),\n Alex Pickering [ctb],\n William Holmes [ctb],\n Mikko Marttila [ctb],\n Andres Quintero [ctb],\n Stéphane Laurent [ctb],\n Posit Software, PBC [cph, fnd]", + "Maintainer": "Joe Cheng ", + "Repository": "RSPM", + "Date/Publication": "2024-04-04 05:03:17 UTC", + "Built": "R 4.4.0; ; 2026-01-29 00:30:01 UTC; unix", + "RemotePkgRef": "DT@0.33", + "RemoteType": "standard", + "RemoteEtag": "\"4a4ba8ab8aa8b8c19704e767f289dfee\"", + "RemotePackaged": "TRUE", + "RemoteRef": "DT", + "RemoteRepos": "https://packagemanager.posit.co/cran/latest", + "RemotePkgPlatform": "source", + "RemoteSha": "0.33" + } + }, + "GGally": { + "Source": "CRAN", + "Repository": "https://packagemanager.posit.co/cran/latest", + "description": { + "Package": "GGally", + "Version": "2.2.1", + "License": "GPL (>= 2.0)", + "Title": "Extension to 'ggplot2'", + "Type": "Package", + "LazyLoad": "yes", + "LazyData": "true", + "URL": "https://ggobi.github.io/ggally/, https://github.com/ggobi/ggally", + "BugReports": "https://github.com/ggobi/ggally/issues", + "Authors@R": "c(\n person(\"Barret\", \"Schloerke\", role = c(\"aut\", \"cre\"), email = \"schloerke@gmail.com\"),\n person(\"Di\", \"Cook\", role = c(\"aut\", \"ths\"), email = \"dicook@monash.edu\"),\n person(\"Joseph\", \"Larmarange\", role = \"aut\", email = \"joseph@larmarange.net\"),\n person(\"Francois\", \"Briatte\", role = \"aut\", email = \"f.briatte@gmail.com\"),\n person(\"Moritz\", \"Marbach\", role = \"aut\", email = \"mmarbach@mail.uni-mannheim.de\"),\n person(\"Edwin\", \"Thoen\", role = \"aut\", email = \"edwinthoen@gmail.com\"),\n person(\"Amos\", \"Elberg\", role = \"aut\", email = \"amos.elberg@gmail.com\"),\n person(\"Ott\", \"Toomet\", role = \"ctb\", email = \"otoomet@gmail.com\"),\n person(\"Jason\", \"Crowley\", role = \"aut\", email = \"crowley.jason.s@gmail.com\"),\n person(\"Heike\", \"Hofmann\", role = \"ths\", email = \"hofmann@iastate.edu\"),\n person(\"Hadley\", \"Wickham\", role = \"ths\", email = \"h.wickham@gmail.com\")\n )", + "Description": "\n The R package 'ggplot2' is a plotting system based on the grammar of graphics.\n 'GGally' extends 'ggplot2' by adding several functions\n to reduce the complexity of combining geometric objects with transformed data.\n Some of these functions include a pairwise plot matrix, a two group pairwise plot\n matrix, a parallel coordinates plot, a survival plot, and several functions to\n plot networks.", + "Depends": "R (>= 3.1), ggplot2 (>= 3.4.4)", + "Imports": "dplyr (>= 1.0.0), tidyr (>= 1.3.0), grDevices, grid, ggstats,\ngtable (>= 0.2.0), lifecycle, plyr (>= 1.8.3), progress,\nRColorBrewer, rlang, scales (>= 1.1.0), utils, magrittr", + "Suggests": "broom (>= 0.7.0), broom.helpers (>= 1.3.0), chemometrics,\ngeosphere (>= 1.5-1), ggforce, Hmisc, igraph (>= 1.0.1),\nintergraph (>= 2.0-2), labelled, maps (>= 3.1.0), mapproj,\nnnet, network (>= 1.17.1), scagnostics, sna (>= 2.3-2),\nsurvival, rmarkdown, roxygen2, testthat, crosstalk, knitr,\nspelling, emmeans, vdiffr", + "RoxygenNote": "7.3.1", + "SystemRequirements": "openssl", + "Encoding": "UTF-8", + "Language": "en-US", + "RdMacros": "lifecycle", + "Config/testthat/edition": "3", + "NeedsCompilation": "no", + "Packaged": "2024-02-13 19:02:36 UTC; barret", + "Author": "Barret Schloerke [aut, cre],\n Di Cook [aut, ths],\n Joseph Larmarange [aut],\n Francois Briatte [aut],\n Moritz Marbach [aut],\n Edwin Thoen [aut],\n Amos Elberg [aut],\n Ott Toomet [ctb],\n Jason Crowley [aut],\n Heike Hofmann [ths],\n Hadley Wickham [ths]", + "Maintainer": "Barret Schloerke ", + "Repository": "RSPM", + "Date/Publication": "2024-02-14 00:53:32 UTC", + "Built": "R 4.4.0; ; 2026-01-29 00:33:44 UTC; unix", + "RemotePkgRef": "GGally@2.2.1", + "RemoteType": "standard", + "RemoteEtag": "\"5a34573e96e6ef125370aadeceeae854\"", + "RemotePackaged": "TRUE", + "RemoteRef": "GGally", + "RemoteRepos": "https://packagemanager.posit.co/cran/latest", + "RemotePkgPlatform": "source", + "RemoteSha": "2.2.1" + } + }, + "IDEAFilter": { + "Source": "CRAN", + "Repository": "https://packagemanager.posit.co/cran/latest", + "description": { + "Package": "IDEAFilter", + "Type": "Package", + "Version": "0.2.0", + "Title": "Agnostic, Idiomatic Data Filter Module for Shiny", + "Description": "When added to an existing shiny app, users may subset any\n developer-chosen R data.frame on the fly. That is, users are empowered to\n slice & dice data by applying multiple (order specific) filters using the\n AND (&) operator between each, and getting real-time updates on the number\n of rows effected/available along the way. Thus, any downstream processes\n that leverage this data source (like tables, plots, or statistical procedures)\n will re-render after new filters are applied. The shiny module’s user interface has\n a 'minimalist' aesthetic so that the focus can be on the data &\n other visuals. In addition to returning a reactive (filtered) data.frame,\n 'IDEAFilter' as also returns 'dplyr' filter statements used to actually slice\n the data.", + "Authors@R": "c(\n person(\n given = \"Aaron\", family = \"Clark\", \n email = \"clark.aaronchris@gmail.com\",\n role = c(\"aut\", \"cre\"),\n comment = c(ORCID = \"0000-0002-0123-0970\")),\n person(\n given = \"Jeff\", family = \"Thompson\", \n email = \"jeff.thompson51317@gmail.com\", role = \"aut\"),\n person(\n given = \"Doug\", family = \"Kelkhoff\", \n email = \"doug.kelkhoff@gmail.com\", role = c(\"ctb\", \"cph\"),\n comment = \"Author of shinyDataFilter\"),\n person(\n given = \"Maya\", family = \"Gans\", \n email = \"maya.gans@biogen.com\", role = \"ctb\"),\n person(family = \"SortableJS contributors\", role = \"ctb\",\n comment = \"SortableJS library\"),\n person(given = \"Biogen\", role = \"cph\"))", + "License": "MIT + file LICENSE", + "URL": "https://biogen-inc.github.io/IDEAFilter/,\nhttps://github.com/Biogen-Inc/IDEAFilter", + "BugReports": "https://github.com/Biogen-Inc/IDEAFilter/issues", + "Encoding": "UTF-8", + "RoxygenNote": "7.3.1", + "Imports": "crayon, ggplot2, pillar (>= 1.5.0), purrr, RColorBrewer,\nshiny, shinyTime", + "Suggests": "dplyr, knitr, rmarkdown, shinytest, shinytest2, spelling,\ntestthat", + "Language": "en-US", + "VignetteBuilder": "knitr", + "Depends": "R (>= 2.10)", + "NeedsCompilation": "no", + "Packaged": "2024-04-15 14:58:41 UTC; aclark02", + "Author": "Aaron Clark [aut, cre] (),\n Jeff Thompson [aut],\n Doug Kelkhoff [ctb, cph] (Author of shinyDataFilter),\n Maya Gans [ctb],\n SortableJS contributors [ctb] (SortableJS library),\n Biogen [cph]", + "Maintainer": "Aaron Clark ", + "Repository": "RSPM", + "Date/Publication": "2024-04-15 15:30:02 UTC", + "Built": "R 4.4.0; ; 2026-01-29 00:33:25 UTC; unix", + "RemotePkgRef": "IDEAFilter@0.2.0", + "RemoteType": "standard", + "RemoteEtag": "\"9b8b265c9ba471d588e2d8ddfc804806\"", + "RemotePackaged": "TRUE", + "RemoteRef": "IDEAFilter", + "RemoteRepos": "https://packagemanager.posit.co/cran/latest", + "RemotePkgPlatform": "source", + "RemoteSha": "0.2.0" + } + }, + "MASS": { + "Source": "CRAN", + "Repository": "https://packagemanager.posit.co/cran/latest", + "description": { + "Package": "MASS", + "Priority": "recommended", + "Version": "7.3-65", + "Date": "2025-02-19", + "Revision": "$Rev: 3681 $", + "Depends": "R (>= 4.4.0), grDevices, graphics, stats, utils", + "Imports": "methods", + "Suggests": "lattice, nlme, nnet, survival", + "Authors@R": "c(person(\"Brian\", \"Ripley\", role = c(\"aut\", \"cre\", \"cph\"),\n email = \"Brian.Ripley@R-project.org\"),\n\t person(\"Bill\", \"Venables\", role = c(\"aut\", \"cph\")),\n\t person(c(\"Douglas\", \"M.\"), \"Bates\", role = \"ctb\"),\n\t person(\"Kurt\", \"Hornik\", role = \"trl\",\n comment = \"partial port ca 1998\"),\n\t person(\"Albrecht\", \"Gebhardt\", role = \"trl\",\n comment = \"partial port ca 1998\"),\n\t person(\"David\", \"Firth\", role = \"ctb\",\n\t comment = \"support functions for polr\"))", + "Description": "Functions and datasets to support Venables and Ripley,\n \"Modern Applied Statistics with S\" (4th edition, 2002).", + "Title": "Support Functions and Datasets for Venables and Ripley's MASS", + "LazyData": "yes", + "ByteCompile": "yes", + "License": "GPL-2 | GPL-3", + "URL": "http://www.stats.ox.ac.uk/pub/MASS4/", + "Contact": "", + "NeedsCompilation": "yes", + "Packaged": "2025-02-19 08:49:43 UTC; ripley", + "Author": "Brian Ripley [aut, cre, cph],\n Bill Venables [aut, cph],\n Douglas M. Bates [ctb],\n Kurt Hornik [trl] (partial port ca 1998),\n Albrecht Gebhardt [trl] (partial port ca 1998),\n David Firth [ctb] (support functions for polr)", + "Maintainer": "Brian Ripley ", + "Repository": "RSPM", + "Date/Publication": "2025-02-28 17:44:52 UTC", + "Encoding": "UTF-8", + "Built": "R 4.4.0; x86_64-pc-linux-gnu; 2026-01-29 00:21:05 UTC; unix", + "RemotePkgRef": "MASS@7.3-65", + "RemoteType": "standard", + "RemoteEtag": "\"ff93099524d0e7e3349641bd32786cbe\"", + "RemotePackaged": "TRUE", + "RemoteRef": "MASS", + "RemoteRepos": "https://packagemanager.posit.co/cran/latest", + "RemotePkgPlatform": "source", + "RemoteSha": "7.3-65" + } + }, + "Matrix": { + "Source": "CRAN", + "Repository": "https://packagemanager.posit.co/cran/latest", + "description": { + "Package": "Matrix", + "Version": "1.7-3", + "VersionNote": "do also bump src/version.h, inst/include/Matrix/version.h", + "Date": "2025-03-05", + "Priority": "recommended", + "Title": "Sparse and Dense Matrix Classes and Methods", + "Description": "A rich hierarchy of sparse and dense matrix classes,\n\tincluding general, symmetric, triangular, and diagonal matrices\n\twith numeric, logical, or pattern entries. Efficient methods for\n\toperating on such matrices, often wrapping the 'BLAS', 'LAPACK',\n\tand 'SuiteSparse' libraries.", + "License": "GPL (>= 2) | file LICENCE", + "URL": "https://Matrix.R-forge.R-project.org", + "BugReports": "https://R-forge.R-project.org/tracker/?atid=294&group_id=61", + "Contact": "Matrix-authors@R-project.org", + "Authors@R": "\n\tc(person(\"Douglas\", \"Bates\", role = \"aut\",\n\t comment = c(ORCID = \"0000-0001-8316-9503\")),\n\t person(\"Martin\", \"Maechler\", role = c(\"aut\", \"cre\"),\n\t email = \"mmaechler+Matrix@gmail.com\",\n\t comment = c(ORCID = \"0000-0002-8685-9910\")),\n\t person(\"Mikael\", \"Jagan\", role = \"aut\",\n\t comment = c(ORCID = \"0000-0002-3542-2938\")),\n\t person(\"Timothy A.\", \"Davis\", role = \"ctb\",\n\t comment = c(ORCID = \"0000-0001-7614-6899\",\n\t \"SuiteSparse libraries\",\n\t \"collaborators listed in dir(system.file(\\\"doc\\\", \\\"SuiteSparse\\\", package=\\\"Matrix\\\"), pattern=\\\"License\\\", full.names=TRUE, recursive=TRUE)\")),\n\t person(\"George\", \"Karypis\", role = \"ctb\",\n\t comment = c(ORCID = \"0000-0003-2753-1437\",\n\t \"METIS library\",\n\t \"Copyright: Regents of the University of Minnesota\")),\n\t person(\"Jason\", \"Riedy\", role = \"ctb\",\n\t comment = c(ORCID = \"0000-0002-4345-4200\",\n\t \"GNU Octave's condest() and onenormest()\",\n\t \"Copyright: Regents of the University of California\")),\n\t person(\"Jens\", \"Oehlschlägel\", role = \"ctb\",\n\t comment = \"initial nearPD()\"),\n\t person(\"R Core Team\", role = \"ctb\",\n\t comment = c(ROR = \"02zz1nj61\", \"base R's matrix implementation\")))", + "Depends": "R (>= 4.4), methods", + "Imports": "grDevices, graphics, grid, lattice, stats, utils", + "Suggests": "MASS, datasets, sfsmisc, tools", + "Enhances": "SparseM, graph", + "LazyData": "no", + "LazyDataNote": "not possible, since we use data/*.R and our S4 classes", + "BuildResaveData": "no", + "Encoding": "UTF-8", + "NeedsCompilation": "yes", + "Packaged": "2025-03-05 09:59:22 UTC; maechler", + "Author": "Douglas Bates [aut] (),\n Martin Maechler [aut, cre] (),\n Mikael Jagan [aut] (),\n Timothy A. Davis [ctb] (,\n SuiteSparse libraries, collaborators listed in\n dir(system.file(\"doc\", \"SuiteSparse\", package=\"Matrix\"),\n pattern=\"License\", full.names=TRUE, recursive=TRUE)),\n George Karypis [ctb] (, METIS\n library, Copyright: Regents of the University of Minnesota),\n Jason Riedy [ctb] (, GNU\n Octave's condest() and onenormest(), Copyright: Regents of the\n University of California),\n Jens Oehlschlägel [ctb] (initial nearPD()),\n R Core Team [ctb] (02zz1nj61, base R's matrix implementation)", + "Maintainer": "Martin Maechler ", + "Repository": "RSPM", + "Date/Publication": "2025-03-11 07:20:02 UTC", + "Built": "R 4.4.0; x86_64-pc-linux-gnu; 2026-01-29 00:22:37 UTC; unix", + "RemotePkgRef": "Matrix@1.7-3", + "RemoteType": "standard", + "RemoteEtag": "\"af68a064c0f1864410b632f1cb4b8614\"", + "RemotePackaged": "TRUE", + "RemoteRef": "Matrix", + "RemoteRepos": "https://packagemanager.posit.co/cran/latest", + "RemotePkgPlatform": "source", + "RemoteSha": "1.7-3" + } + }, + "R6": { + "Source": "CRAN", + "Repository": "https://packagemanager.posit.co/cran/latest", + "description": { + "Package": "R6", + "Title": "Encapsulated Classes with Reference Semantics", + "Version": "2.6.1", + "Authors@R": "c(\n person(\"Winston\", \"Chang\", , \"winston@posit.co\", role = c(\"aut\", \"cre\")),\n person(\"Posit Software, PBC\", role = c(\"cph\", \"fnd\"))\n )", + "Description": "Creates classes with reference semantics, similar to R's\n built-in reference classes. Compared to reference classes, R6 classes\n are simpler and lighter-weight, and they are not built on S4 classes\n so they do not require the methods package. These classes allow public\n and private members, and they support inheritance, even when the\n classes are defined in different packages.", + "License": "MIT + file LICENSE", + "URL": "https://r6.r-lib.org, https://github.com/r-lib/R6", + "BugReports": "https://github.com/r-lib/R6/issues", + "Depends": "R (>= 3.6)", + "Suggests": "lobstr, testthat (>= 3.0.0)", + "Config/Needs/website": "tidyverse/tidytemplate, ggplot2, microbenchmark,\nscales", + "Config/testthat/edition": "3", + "Encoding": "UTF-8", + "RoxygenNote": "7.3.2", + "NeedsCompilation": "no", + "Packaged": "2025-02-14 21:15:19 UTC; winston", + "Author": "Winston Chang [aut, cre],\n Posit Software, PBC [cph, fnd]", + "Maintainer": "Winston Chang ", + "Repository": "RSPM", + "Date/Publication": "2025-02-15 00:50:02 UTC", + "Built": "R 4.4.0; ; 2026-01-29 00:21:04 UTC; unix", + "RemotePkgRef": "R6@2.6.1", + "RemoteType": "standard", + "RemoteEtag": "\"b33833f3cbd24baf862a2c87b5bae13a\"", + "RemotePackaged": "TRUE", + "RemoteRef": "R6", + "RemoteRepos": "https://packagemanager.posit.co/cran/latest", + "RemotePkgPlatform": "source", + "RemoteSha": "2.6.1" + } + }, + "RColorBrewer": { + "Source": "CRAN", + "Repository": "https://packagemanager.posit.co/cran/latest", + "description": { + "Package": "RColorBrewer", + "Version": "1.1-3", + "Date": "2022-04-03", + "Title": "ColorBrewer Palettes", + "Authors@R": "c(person(given = \"Erich\", family = \"Neuwirth\", role = c(\"aut\",\n \"cre\"), email = \"erich.neuwirth@univie.ac.at\"))", + "Author": "Erich Neuwirth [aut, cre]", + "Maintainer": "Erich Neuwirth ", + "Depends": "R (>= 2.0.0)", + "Description": "Provides color schemes for maps (and other graphics)\n designed by Cynthia Brewer as described at http://colorbrewer2.org.", + "License": "Apache License 2.0", + "Packaged": "2022-04-03 10:26:20 UTC; neuwirth", + "NeedsCompilation": "no", + "Repository": "RSPM", + "Date/Publication": "2022-04-03 19:20:13 UTC", + "Encoding": "UTF-8", + "Built": "R 4.4.0; ; 2026-01-29 00:21:16 UTC; unix", + "RemoteType": "standard", + "RemotePkgRef": "RColorBrewer", + "RemoteRef": "RColorBrewer", + "RemoteRepos": "https://packagemanager.posit.co/cran/latest", + "RemotePkgPlatform": "source", + "RemoteSha": "1.1-3" + } + }, + "Rcpp": { + "Source": "CRAN", + "Repository": "https://packagemanager.posit.co/cran/latest", + "description": { + "Package": "Rcpp", + "Title": "Seamless R and C++ Integration", + "Version": "1.0.14", + "Date": "2025-01-11", + "Authors@R": "c(person(\"Dirk\", \"Eddelbuettel\", role = c(\"aut\", \"cre\"), email = \"edd@debian.org\",\n comment = c(ORCID = \"0000-0001-6419-907X\")),\n person(\"Romain\", \"Francois\", role = \"aut\",\n comment = c(ORCID = \"0000-0002-2444-4226\")),\n person(\"JJ\", \"Allaire\", role = \"aut\",\n comment = c(ORCID = \"0000-0003-0174-9868\")),\n person(\"Kevin\", \"Ushey\", role = \"aut\",\n comment = c(ORCID = \"0000-0003-2880-7407\")),\n person(\"Qiang\", \"Kou\", role = \"aut\",\n comment = c(ORCID = \"0000-0001-6786-5453\")),\n person(\"Nathan\", \"Russell\", role = \"aut\"),\n person(\"Iñaki\", \"Ucar\", role = \"aut\",\n comment = c(ORCID = \"0000-0001-6403-5550\")),\n person(\"Doug\", \"Bates\", role = \"aut\",\n comment = c(ORCID = \"0000-0001-8316-9503\")),\n person(\"John\", \"Chambers\", role = \"aut\"))", + "Description": "The 'Rcpp' package provides R functions as well as C++ classes which\n offer a seamless integration of R and C++. Many R data types and objects can be\n mapped back and forth to C++ equivalents which facilitates both writing of new\n code as well as easier integration of third-party libraries. Documentation\n about 'Rcpp' is provided by several vignettes included in this package, via the\n 'Rcpp Gallery' site at , the paper by Eddelbuettel and\n Francois (2011, ), the book by Eddelbuettel (2013,\n ) and the paper by Eddelbuettel and Balamuta (2018,\n ); see 'citation(\"Rcpp\")' for details.", + "Imports": "methods, utils", + "Suggests": "tinytest, inline, rbenchmark, pkgKitten (>= 0.1.2)", + "URL": "https://www.rcpp.org,\nhttps://dirk.eddelbuettel.com/code/rcpp.html,\nhttps://github.com/RcppCore/Rcpp", + "License": "GPL (>= 2)", + "BugReports": "https://github.com/RcppCore/Rcpp/issues", + "MailingList": "rcpp-devel@lists.r-forge.r-project.org", + "RoxygenNote": "6.1.1", + "Encoding": "UTF-8", + "NeedsCompilation": "yes", + "Packaged": "2025-01-11 20:21:25 UTC; edd", + "Author": "Dirk Eddelbuettel [aut, cre] (),\n Romain Francois [aut] (),\n JJ Allaire [aut] (),\n Kevin Ushey [aut] (),\n Qiang Kou [aut] (),\n Nathan Russell [aut],\n Iñaki Ucar [aut] (),\n Doug Bates [aut] (),\n John Chambers [aut]", + "Maintainer": "Dirk Eddelbuettel ", + "Repository": "RSPM", + "Date/Publication": "2025-01-12 16:10:02 UTC", + "Built": "R 4.4.0; x86_64-pc-linux-gnu; 2026-01-29 00:22:15 UTC; unix", + "RemotePkgRef": "Rcpp@1.0.14", + "RemoteType": "standard", + "RemoteEtag": "\"87bd6fd224528f3ce635b1da1103818b\"", + "RemotePackaged": "TRUE", + "RemoteRef": "Rcpp", + "RemoteRepos": "https://packagemanager.posit.co/cran/latest", + "RemotePkgPlatform": "source", + "RemoteSha": "1.0.14" + } + }, + "V8": { + "Source": "CRAN", + "Repository": "https://packagemanager.posit.co/cran/latest", + "description": { + "Package": "V8", + "Type": "Package", + "Title": "Embedded JavaScript and WebAssembly Engine for R", + "Version": "6.0.3", + "Authors@R": "c(\n person(\"Jeroen\", \"Ooms\", role = c(\"aut\", \"cre\"), email = \"jeroenooms@gmail.com\",\n comment = c(ORCID = \"0000-0002-4035-0289\")),\n person(\"Jan Marvin\", \"Garbuszus\", role = \"ctb\"))", + "Description": "An R interface to V8 : Google's open source JavaScript\n and WebAssembly engine. This package can be compiled either with V8 version 6 \n and up or NodeJS when built as a shared library.", + "License": "MIT + file LICENSE", + "URL": "https://jeroen.r-universe.dev/V8", + "BugReports": "https://github.com/jeroen/v8/issues", + "SystemRequirements": "V8 engine version 6+ is needed for ES6 and WASM\nsupport. On Linux you can build against libv8-dev (Debian) or\nv8-devel (Fedora). We also provide static libv8 binaries for\nmost platforms, see the README for details.", + "NeedsCompilation": "yes", + "VignetteBuilder": "knitr", + "Imports": "Rcpp (>= 0.12.12), jsonlite (>= 1.0), curl (>= 1.0), utils", + "LinkingTo": "Rcpp", + "Suggests": "testthat, knitr, rmarkdown", + "RoxygenNote": "7.3.1", + "Language": "en-US", + "Encoding": "UTF-8", + "Biarch": "true", + "Packaged": "2025-03-23 18:47:29 UTC; jeroen", + "Author": "Jeroen Ooms [aut, cre] (),\n Jan Marvin Garbuszus [ctb]", + "Maintainer": "Jeroen Ooms ", + "Repository": "RSPM", + "Date/Publication": "2025-03-26 06:50:02 UTC", + "Built": "R 4.4.0; x86_64-pc-linux-gnu; 2026-01-29 00:23:46 UTC; unix", + "RemotePkgRef": "V8@6.0.3", + "RemoteType": "standard", + "RemoteEtag": "\"2820d595461bf711af42b8d81fc4a175\"", + "RemotePackaged": "TRUE", + "RemoteRef": "V8", + "RemoteRepos": "https://packagemanager.posit.co/cran/latest", + "RemotePkgPlatform": "source", + "RemoteSha": "6.0.3" + } + }, + "arrow": { + "Source": "CRAN", + "Repository": "https://packagemanager.posit.co/cran/latest", + "description": { + "Package": "arrow", + "Title": "Integration to 'Apache' 'Arrow'", + "Version": "20.0.0.2", + "Authors@R": "c(\n person(\"Neal\", \"Richardson\", email = \"neal.p.richardson@gmail.com\", role = c(\"aut\")),\n person(\"Ian\", \"Cook\", email = \"ianmcook@gmail.com\", role = c(\"aut\")),\n person(\"Nic\", \"Crane\", email = \"thisisnic@gmail.com\", role = c(\"aut\")),\n person(\"Dewey\", \"Dunnington\", role = c(\"aut\"), email = \"dewey@fishandwhistle.net\", comment = c(ORCID = \"0000-0002-9415-4582\")),\n person(\"Romain\", \"Fran\\u00e7ois\", role = c(\"aut\"), comment = c(ORCID = \"0000-0002-2444-4226\")),\n person(\"Jonathan\", \"Keane\", email = \"jkeane@gmail.com\", role = c(\"aut\", \"cre\")),\n person(\"Drago\\u0219\", \"Moldovan-Gr\\u00fcnfeld\", email = \"dragos.mold@gmail.com\", role = c(\"aut\")),\n person(\"Jeroen\", \"Ooms\", email = \"jeroen@berkeley.edu\", role = c(\"aut\")),\n person(\"Jacob\", \"Wujciak-Jens\", email = \"jacob@wujciak.de\", role = c(\"aut\")),\n person(\"Javier\", \"Luraschi\", email = \"javier@rstudio.com\", role = c(\"ctb\")),\n person(\"Karl\", \"Dunkle Werner\", email = \"karldw@users.noreply.github.com\", role = c(\"ctb\"), comment = c(ORCID = \"0000-0003-0523-7309\")),\n person(\"Jeffrey\", \"Wong\", email = \"jeffreyw@netflix.com\", role = c(\"ctb\")),\n person(\"Apache Arrow\", email = \"dev@arrow.apache.org\", role = c(\"aut\", \"cph\"))\n )", + "Description": "'Apache' 'Arrow' is a cross-language\n development platform for in-memory data. It specifies a standardized\n language-independent columnar memory format for flat and hierarchical data,\n organized for efficient analytic operations on modern hardware. This\n package provides an interface to the 'Arrow C++' library.", + "Depends": "R (>= 4.0)", + "License": "Apache License (>= 2.0)", + "URL": "https://github.com/apache/arrow/, https://arrow.apache.org/docs/r/", + "BugReports": "https://github.com/apache/arrow/issues", + "Encoding": "UTF-8", + "Language": "en-US", + "SystemRequirements": "C++17; for AWS S3 support on Linux, libcurl and\nopenssl (optional); cmake >= 3.16 (build-time only, and only\nfor full source build)", + "Biarch": "true", + "Imports": "assertthat, bit64 (>= 0.9-7), glue, methods, purrr, R6, rlang\n(>= 1.0.0), stats, tidyselect (>= 1.0.0), utils, vctrs", + "RoxygenNote": "7.3.2", + "Config/testthat/edition": "3", + "Config/build/bootstrap": "TRUE", + "Suggests": "blob, curl, cli, DBI, dbplyr, decor, distro, dplyr, duckdb\n(>= 0.2.8), hms, jsonlite, knitr, lubridate, pillar, pkgload,\nreticulate, rmarkdown, stringi, stringr, sys, testthat (>=\n3.1.0), tibble, tzdb, withr", + "LinkingTo": "cpp11 (>= 0.4.2)", + "Collate": "'arrowExports.R' 'enums.R' 'arrow-object.R' 'type.R'\n'array-data.R' 'arrow-datum.R' 'array.R' 'arrow-info.R'\n'arrow-package.R' 'arrow-tabular.R' 'buffer.R'\n'chunked-array.R' 'io.R' 'compression.R' 'scalar.R' 'compute.R'\n'config.R' 'csv.R' 'dataset.R' 'dataset-factory.R'\n'dataset-format.R' 'dataset-partition.R' 'dataset-scan.R'\n'dataset-write.R' 'dictionary.R' 'dplyr-across.R'\n'dplyr-arrange.R' 'dplyr-by.R' 'dplyr-collect.R'\n'dplyr-count.R' 'dplyr-datetime-helpers.R' 'dplyr-distinct.R'\n'dplyr-eval.R' 'dplyr-filter.R' 'dplyr-funcs-agg.R'\n'dplyr-funcs-augmented.R' 'dplyr-funcs-conditional.R'\n'dplyr-funcs-datetime.R' 'dplyr-funcs-doc.R'\n'dplyr-funcs-math.R' 'dplyr-funcs-simple.R'\n'dplyr-funcs-string.R' 'dplyr-funcs-type.R' 'expression.R'\n'dplyr-funcs.R' 'dplyr-glimpse.R' 'dplyr-group-by.R'\n'dplyr-join.R' 'dplyr-mutate.R' 'dplyr-select.R'\n'dplyr-slice.R' 'dplyr-summarize.R' 'dplyr-union.R'\n'record-batch.R' 'table.R' 'dplyr.R' 'duckdb.R' 'extension.R'\n'feather.R' 'field.R' 'filesystem.R' 'flight.R'\n'install-arrow.R' 'ipc-stream.R' 'json.R' 'memory-pool.R'\n'message.R' 'metadata.R' 'parquet.R' 'python.R'\n'query-engine.R' 'record-batch-reader.R'\n'record-batch-writer.R' 'reexports-bit64.R'\n'reexports-tidyselect.R' 'schema.R' 'udf.R' 'util.R'", + "NeedsCompilation": "yes", + "Packaged": "2025-05-26 12:56:51 UTC; jkeane", + "Author": "Neal Richardson [aut],\n Ian Cook [aut],\n Nic Crane [aut],\n Dewey Dunnington [aut] (ORCID: ),\n Romain François [aut] (ORCID: ),\n Jonathan Keane [aut, cre],\n Dragoș Moldovan-Grünfeld [aut],\n Jeroen Ooms [aut],\n Jacob Wujciak-Jens [aut],\n Javier Luraschi [ctb],\n Karl Dunkle Werner [ctb] (ORCID:\n ),\n Jeffrey Wong [ctb],\n Apache Arrow [aut, cph]", + "Maintainer": "Jonathan Keane ", + "Repository": "RSPM", + "Date/Publication": "2025-05-26 17:50:02 UTC", + "Built": "R 4.4.0; x86_64-pc-linux-gnu; 2026-01-29 00:54:09 UTC; unix", + "RemotePkgRef": "arrow@20.0.0.2", + "RemoteType": "standard", + "RemoteEtag": "\"a27699f8f8cf76d69d95b0425a15665b\"", + "RemotePackaged": "TRUE", + "RemoteRef": "arrow", + "RemoteRepos": "https://packagemanager.posit.co/cran/latest", + "RemotePkgPlatform": "source", + "RemoteSha": "20.0.0.2" + } + }, + "askpass": { + "Source": "CRAN", + "Repository": "https://packagemanager.posit.co/cran/latest", + "description": { + "Package": "askpass", + "Type": "Package", + "Title": "Password Entry Utilities for R, Git, and SSH", + "Version": "1.2.1", + "Authors@R": "person(\"Jeroen\", \"Ooms\", role = c(\"aut\", \"cre\"), \n email = \"jeroenooms@gmail.com\", comment = c(ORCID = \"0000-0002-4035-0289\"))", + "Description": "Cross-platform utilities for prompting the user for credentials or a \n passphrase, for example to authenticate with a server or read a protected key.\n Includes native programs for MacOS and Windows, hence no 'tcltk' is required. \n Password entry can be invoked in two different ways: directly from R via the \n askpass() function, or indirectly as password-entry back-end for 'ssh-agent' \n or 'git-credential' via the SSH_ASKPASS and GIT_ASKPASS environment variables.\n Thereby the user can be prompted for credentials or a passphrase if needed \n when R calls out to git or ssh.", + "License": "MIT + file LICENSE", + "URL": "https://r-lib.r-universe.dev/askpass", + "BugReports": "https://github.com/r-lib/askpass/issues", + "Encoding": "UTF-8", + "Imports": "sys (>= 2.1)", + "RoxygenNote": "7.2.3", + "Suggests": "testthat", + "Language": "en-US", + "NeedsCompilation": "yes", + "Packaged": "2024-10-03 14:12:09 UTC; jeroen", + "Author": "Jeroen Ooms [aut, cre] ()", + "Maintainer": "Jeroen Ooms ", + "Repository": "RSPM", + "Date/Publication": "2024-10-04 07:20:03 UTC", + "Built": "R 4.4.0; x86_64-pc-linux-gnu; 2026-01-29 00:23:18 UTC; unix", + "RemoteType": "standard", + "RemotePkgRef": "askpass", + "RemoteRef": "askpass", + "RemoteRepos": "https://packagemanager.posit.co/cran/latest", + "RemotePkgPlatform": "source", + "RemoteSha": "1.2.1" + } + }, + "assertthat": { + "Source": "CRAN", + "Repository": "https://packagemanager.posit.co/cran/latest", + "description": { + "Package": "assertthat", + "Title": "Easy Pre and Post Assertions", + "Version": "0.2.1", + "Authors@R": "\n person(\"Hadley\", \"Wickham\", , \"hadley@rstudio.com\", c(\"aut\", \"cre\"))", + "Description": "An extension to stopifnot() that makes it easy to declare \n the pre and post conditions that you code should satisfy, while also \n producing friendly error messages so that your users know what's gone\n wrong.", + "License": "GPL-3", + "Imports": "tools", + "Suggests": "testthat, covr", + "RoxygenNote": "6.0.1", + "Collate": "'assert-that.r' 'on-failure.r' 'assertions-file.r'\n'assertions-scalar.R' 'assertions.r' 'base.r'\n'base-comparison.r' 'base-is.r' 'base-logical.r' 'base-misc.r'\n'utils.r' 'validate-that.R'", + "NeedsCompilation": "no", + "Packaged": "2019-03-21 13:11:01 UTC; hadley", + "Author": "Hadley Wickham [aut, cre]", + "Maintainer": "Hadley Wickham ", + "Repository": "RSPM", + "Date/Publication": "2019-03-21 14:53:46 UTC", + "Encoding": "UTF-8", + "Built": "R 4.4.0; ; 2026-01-29 00:21:05 UTC; unix", + "RemotePkgRef": "assertthat@0.2.1", + "RemoteType": "standard", + "RemoteEtag": "\"e6cf315c30fa852f9e616dadfe4e2ce1\"", + "RemotePackaged": "TRUE", + "RemoteRef": "assertthat", + "RemoteRepos": "https://packagemanager.posit.co/cran/latest", + "RemotePkgPlatform": "source", + "RemoteSha": "0.2.1" + } + }, + "attempt": { + "Source": "CRAN", + "Repository": "https://packagemanager.posit.co/cran/latest", + "description": { + "Package": "attempt", + "Title": "Tools for Defensive Programming", + "Version": "0.3.1", + "Authors@R": "person(\"Colin\", \"Fay\", email = \"contact@colinfay.me\", role = c(\"aut\", \"cre\"), comment=c(ORCID=\"0000-0001-7343-1846\"))", + "Description": "Tools for defensive programming, inspired by 'purrr' mappers and \n based on 'rlang'.'attempt' extends and facilitates defensive programming by \n providing a consistent grammar, and provides a set of easy to use functions \n for common tests and conditions. 'attempt' only depends on 'rlang', and \n focuses on speed, so it can be easily integrated in other functions and \n used in data analysis. ", + "License": "MIT + file LICENSE", + "Encoding": "UTF-8", + "URL": "https://github.com/ColinFay/attempt", + "LazyData": "true", + "Suggests": "testthat, knitr, rmarkdown, curl", + "VignetteBuilder": "knitr", + "Imports": "rlang", + "RoxygenNote": "7.1.0", + "NeedsCompilation": "no", + "Packaged": "2020-05-03 20:24:38 UTC; colin", + "Author": "Colin Fay [aut, cre] ()", + "Maintainer": "Colin Fay ", + "Repository": "RSPM", + "Date/Publication": "2020-05-03 20:50:02 UTC", + "Built": "R 4.4.0; ; 2026-01-29 00:23:08 UTC; unix", + "RemoteType": "standard", + "RemotePkgRef": "attempt", + "RemoteRef": "attempt", + "RemoteRepos": "https://packagemanager.posit.co/cran/latest", + "RemotePkgPlatform": "source", + "RemoteSha": "0.3.1" + } + }, + "backports": { + "Source": "CRAN", + "Repository": "https://packagemanager.posit.co/cran/latest", + "description": { + "Package": "backports", + "Type": "Package", + "Title": "Reimplementations of Functions Introduced Since R-3.0.0", + "Version": "1.5.0", + "Authors@R": "c(\n person(\"Michel\", \"Lang\", NULL, \"michellang@gmail.com\",\n role = c(\"cre\", \"aut\"), comment = c(ORCID = \"0000-0001-9754-0393\")),\n person(\"Duncan\", \"Murdoch\", NULL, \"murdoch.duncan@gmail.com\",\n role = c(\"aut\")),\n person(\"R Core Team\", role = \"aut\"))", + "Maintainer": "Michel Lang ", + "Description": "\n Functions introduced or changed since R v3.0.0 are re-implemented in this\n package. The backports are conditionally exported in order to let R resolve\n the function name to either the implemented backport, or the respective base\n version, if available. Package developers can make use of new functions or\n arguments by selectively importing specific backports to\n support older installations.", + "URL": "https://github.com/r-lib/backports", + "BugReports": "https://github.com/r-lib/backports/issues", + "License": "GPL-2 | GPL-3", + "NeedsCompilation": "yes", + "ByteCompile": "yes", + "Depends": "R (>= 3.0.0)", + "Encoding": "UTF-8", + "RoxygenNote": "7.3.1", + "Packaged": "2024-05-23 11:56:25 UTC; michel", + "Author": "Michel Lang [cre, aut] (),\n Duncan Murdoch [aut],\n R Core Team [aut]", + "Repository": "RSPM", + "Date/Publication": "2024-05-23 12:30:02 UTC", + "Built": "R 4.4.0; x86_64-pc-linux-gnu; 2026-01-29 00:21:55 UTC; unix", + "RemoteType": "standard", + "RemotePkgRef": "backports", + "RemoteRef": "backports", + "RemoteRepos": "https://packagemanager.posit.co/cran/latest", + "RemotePkgPlatform": "source", + "RemoteSha": "1.5.0" + } + }, + "base64enc": { + "Source": "CRAN", + "Repository": "https://packagemanager.posit.co/cran/latest", + "description": { + "Package": "base64enc", + "Version": "0.1-3", + "Title": "Tools for base64 encoding", + "Author": "Simon Urbanek ", + "Maintainer": "Simon Urbanek ", + "Depends": "R (>= 2.9.0)", + "Enhances": "png", + "Description": "This package provides tools for handling base64 encoding. It is more flexible than the orphaned base64 package.", + "License": "GPL-2 | GPL-3", + "URL": "http://www.rforge.net/base64enc", + "NeedsCompilation": "yes", + "Packaged": "2015-02-04 20:31:00 UTC; svnuser", + "Repository": "RSPM", + "Date/Publication": "2015-07-28 08:03:37", + "Encoding": "UTF-8", + "Built": "R 4.4.0; x86_64-pc-linux-gnu; 2026-01-29 00:21:05 UTC; unix", + "RemoteType": "standard", + "RemotePkgRef": "base64enc", + "RemoteRef": "base64enc", + "RemoteRepos": "https://packagemanager.posit.co/cran/latest", + "RemotePkgPlatform": "source", + "RemoteSha": "0.1-3" + } + }, + "bigD": { + "Source": "CRAN", + "Repository": "https://packagemanager.posit.co/cran/latest", + "description": { + "Type": "Package", + "Package": "bigD", + "Title": "Flexibly Format Dates and Times to a Given Locale", + "Version": "0.3.1", + "Description": "Format dates and times flexibly and to whichever locales\n make sense. Parses dates, times, and date-times in various formats\n (including string-based ISO 8601 constructions). The formatting syntax gives\n the user many options for formatting the date and time output in a precise\n manner. Time zones in the input can be expressed in multiple ways and there\n are many options for formatting time zones in the output as well. Several of\n the provided helper functions allow for automatic generation of locale-aware\n formatting patterns based on date/time skeleton formats and standardized\n date/time formats with varying specificity.", + "Authors@R": "c(\n person(\"Richard\", \"Iannone\", , \"rich@posit.co\", role = c(\"aut\", \"cre\"),\n comment = c(ORCID = \"0000-0003-3925-190X\")),\n person(\"Olivier\", \"Roy\", role = \"ctb\"),\n person(\"Posit Software, PBC\", role = c(\"cph\", \"fnd\"))\n )", + "License": "MIT + file LICENSE", + "URL": "https://rstudio.github.io/bigD/, https://github.com/rstudio/bigD", + "BugReports": "https://github.com/rstudio/bigD/issues", + "Encoding": "UTF-8", + "RoxygenNote": "7.3.2", + "Depends": "R (>= 3.6.0)", + "Suggests": "testthat (>= 3.0.0), vctrs (>= 0.5.0)", + "Config/testthat/edition": "3", + "Config/testthat/parallel": "true", + "NeedsCompilation": "no", + "Packaged": "2025-04-03 13:52:40 UTC; riannone", + "Author": "Richard Iannone [aut, cre] (),\n Olivier Roy [ctb],\n Posit Software, PBC [cph, fnd]", + "Maintainer": "Richard Iannone ", + "Repository": "RSPM", + "Date/Publication": "2025-04-03 14:20:02 UTC", + "Built": "R 4.4.0; ; 2026-01-29 00:21:32 UTC; unix", + "RemoteType": "standard", + "RemotePkgRef": "bigD", + "RemoteRef": "bigD", + "RemoteRepos": "https://packagemanager.posit.co/cran/latest", + "RemotePkgPlatform": "source", + "RemoteSha": "0.3.1" + } + }, + "bit": { + "Source": "CRAN", + "Repository": "https://packagemanager.posit.co/cran/latest", + "description": { + "Package": "bit", + "Title": "Classes and Methods for Fast Memory-Efficient Boolean Selections", + "Version": "4.6.0", + "Authors@R": "c(\n person(\"Michael\", \"Chirico\", email = \"MichaelChirico4@gmail.com\", role = c(\"aut\", \"cre\")),\n person(\"Jens\", \"Oehlschlägel\", role = \"aut\"),\n person(\"Brian\", \"Ripley\", role = \"ctb\")\n )", + "Depends": "R (>= 3.4.0)", + "Suggests": "testthat (>= 3.0.0), roxygen2, knitr, markdown, rmarkdown,\nmicrobenchmark, bit64 (>= 4.0.0), ff (>= 4.0.0)", + "Description": "Provided are classes for boolean and skewed boolean vectors,\n fast boolean methods, fast unique and non-unique integer sorting,\n fast set operations on sorted and unsorted sets of integers, and\n foundations for ff (range index, compression, chunked processing).", + "License": "GPL-2 | GPL-3", + "LazyLoad": "yes", + "ByteCompile": "yes", + "Encoding": "UTF-8", + "URL": "https://github.com/r-lib/bit", + "VignetteBuilder": "knitr, rmarkdown", + "RoxygenNote": "7.3.2", + "Config/testthat/edition": "3", + "NeedsCompilation": "yes", + "Packaged": "2025-03-05 07:18:45 UTC; michael", + "Author": "Michael Chirico [aut, cre],\n Jens Oehlschlägel [aut],\n Brian Ripley [ctb]", + "Maintainer": "Michael Chirico ", + "Repository": "RSPM", + "Date/Publication": "2025-03-06 10:50:01 UTC", + "Built": "R 4.4.0; x86_64-pc-linux-gnu; 2026-01-29 00:21:28 UTC; unix", + "RemoteType": "standard", + "RemotePkgRef": "bit", + "RemoteRef": "bit", + "RemoteRepos": "https://packagemanager.posit.co/cran/latest", + "RemotePkgPlatform": "source", + "RemoteSha": "4.6.0" + } + }, + "bit64": { + "Source": "CRAN", + "Repository": "https://packagemanager.posit.co/cran/latest", + "description": { + "Package": "bit64", + "Title": "A S3 Class for Vectors of 64bit Integers", + "Version": "4.6.0-1", + "Authors@R": "c(\n person(\"Michael\", \"Chirico\", email = \"michaelchirico4@gmail.com\", role = c(\"aut\", \"cre\")),\n person(\"Jens\", \"Oehlschlägel\", role = \"aut\"),\n person(\"Leonardo\", \"Silvestri\", role = \"ctb\"),\n person(\"Ofek\", \"Shilon\", role = \"ctb\")\n )", + "Depends": "R (>= 3.4.0), bit (>= 4.0.0)", + "Description": "\n Package 'bit64' provides serializable S3 atomic 64bit (signed) integers.\n These are useful for handling database keys and exact counting in +-2^63.\n WARNING: do not use them as replacement for 32bit integers, integer64 are not\n supported for subscripting by R-core and they have different semantics when\n combined with double, e.g. integer64 + double => integer64.\n Class integer64 can be used in vectors, matrices, arrays and data.frames.\n Methods are available for coercion from and to logicals, integers, doubles,\n characters and factors as well as many elementwise and summary functions.\n Many fast algorithmic operations such as 'match' and 'order' support inter-\n active data exploration and manipulation and optionally leverage caching.", + "License": "GPL-2 | GPL-3", + "LazyLoad": "yes", + "ByteCompile": "yes", + "URL": "https://github.com/r-lib/bit64", + "Encoding": "UTF-8", + "Imports": "graphics, methods, stats, utils", + "Suggests": "testthat (>= 3.0.3), withr", + "Config/testthat/edition": "3", + "Config/needs/development": "testthat", + "RoxygenNote": "7.3.2", + "NeedsCompilation": "yes", + "Packaged": "2025-01-16 14:04:20 UTC; michael", + "Author": "Michael Chirico [aut, cre],\n Jens Oehlschlägel [aut],\n Leonardo Silvestri [ctb],\n Ofek Shilon [ctb]", + "Maintainer": "Michael Chirico ", + "Repository": "RSPM", + "Date/Publication": "2025-01-16 16:00:07 UTC", + "Built": "R 4.4.0; x86_64-pc-linux-gnu; 2026-01-29 00:22:58 UTC; unix", + "RemoteType": "standard", + "RemotePkgRef": "bit64", + "RemoteRef": "bit64", + "RemoteRepos": "https://packagemanager.posit.co/cran/latest", + "RemotePkgPlatform": "source", + "RemoteSha": "4.6.0-1" + } + }, + "bitops": { + "Source": "CRAN", + "Repository": "https://packagemanager.posit.co/cran/latest", + "description": { + "Package": "bitops", + "Version": "1.0-9", + "Date": "2024-10-03", + "Authors@R": "c(\n person(\"Steve\", \"Dutky\", role = \"aut\", email = \"sdutky@terpalum.umd.edu\",\n \t comment = \"S original; then (after MM's port) revised and modified\"),\n person(\"Martin\", \"Maechler\", role = c(\"cre\", \"aut\"), email = \"maechler@stat.math.ethz.ch\",\n\t comment = c(\"Initial R port; tweaks\", ORCID = \"0000-0002-8685-9910\")))", + "Title": "Bitwise Operations", + "Description": "Functions for bitwise operations on integer vectors.", + "License": "GPL (>= 2)", + "URL": "https://github.com/mmaechler/R-bitops", + "BugReports": "https://github.com/mmaechler/R-bitops/issues", + "NeedsCompilation": "yes", + "Packaged": "2024-10-03 09:17:35 UTC; maechler", + "Author": "Steve Dutky [aut] (S original; then (after MM's port) revised and\n modified),\n Martin Maechler [cre, aut] (Initial R port; tweaks,\n )", + "Maintainer": "Martin Maechler ", + "Repository": "RSPM", + "Date/Publication": "2024-10-03 23:00:54 UTC", + "Encoding": "UTF-8", + "Built": "R 4.4.0; x86_64-pc-linux-gnu; 2026-01-29 00:21:35 UTC; unix", + "RemoteType": "standard", + "RemotePkgRef": "bitops", + "RemoteRef": "bitops", + "RemoteRepos": "https://packagemanager.posit.co/cran/latest", + "RemotePkgPlatform": "source", + "RemoteSha": "1.0-9" + } + }, + "broom": { + "Source": "CRAN", + "Repository": "https://packagemanager.posit.co/cran/latest", + "description": { + "Type": "Package", + "Package": "broom", + "Title": "Convert Statistical Objects into Tidy Tibbles", + "Version": "1.0.8", + "Authors@R": "\n c(person(given = \"David\",\n family = \"Robinson\",\n role = \"aut\",\n email = \"admiral.david@gmail.com\"),\n person(given = \"Alex\",\n family = \"Hayes\",\n role = \"aut\",\n email = \"alexpghayes@gmail.com\",\n comment = c(ORCID = \"0000-0002-4985-5160\")),\n person(given = \"Simon\",\n family = \"Couch\",\n role = c(\"aut\", \"cre\"),\n email = \"simon.couch@posit.co\",\n comment = c(ORCID = \"0000-0001-5676-5107\")),\n person(given = \"Posit Software, PBC\", role = c(\"cph\", \"fnd\")),\n person(given = \"Indrajeet\",\n family = \"Patil\",\n role = \"ctb\",\n email = \"patilindrajeet.science@gmail.com\",\n comment = c(ORCID = \"0000-0003-1995-6531\")),\n person(given = \"Derek\",\n family = \"Chiu\",\n role = \"ctb\",\n email = \"dchiu@bccrc.ca\"),\n person(given = \"Matthieu\",\n family = \"Gomez\",\n role = \"ctb\",\n email = \"mattg@princeton.edu\"),\n person(given = \"Boris\",\n family = \"Demeshev\",\n role = \"ctb\",\n email = \"boris.demeshev@gmail.com\"),\n person(given = \"Dieter\",\n family = \"Menne\",\n role = \"ctb\",\n email = \"dieter.menne@menne-biomed.de\"),\n person(given = \"Benjamin\",\n family = \"Nutter\",\n role = \"ctb\",\n email = \"nutter@battelle.org\"),\n person(given = \"Luke\",\n family = \"Johnston\",\n role = \"ctb\",\n email = \"luke.johnston@mail.utoronto.ca\"),\n person(given = \"Ben\",\n family = \"Bolker\",\n role = \"ctb\",\n email = \"bolker@mcmaster.ca\"),\n person(given = \"Francois\",\n family = \"Briatte\",\n role = \"ctb\",\n email = \"f.briatte@gmail.com\"),\n person(given = \"Jeffrey\",\n family = \"Arnold\",\n role = \"ctb\",\n email = \"jeffrey.arnold@gmail.com\"),\n person(given = \"Jonah\",\n family = \"Gabry\",\n role = \"ctb\",\n email = \"jsg2201@columbia.edu\"),\n person(given = \"Luciano\",\n family = \"Selzer\",\n role = \"ctb\",\n email = \"luciano.selzer@gmail.com\"),\n person(given = \"Gavin\",\n family = \"Simpson\",\n role = \"ctb\",\n email = \"ucfagls@gmail.com\"),\n person(given = \"Jens\",\n family = \"Preussner\",\n role = \"ctb\",\n email = \" jens.preussner@mpi-bn.mpg.de\"),\n person(given = \"Jay\",\n family = \"Hesselberth\",\n role = \"ctb\",\n email = \"jay.hesselberth@gmail.com\"),\n person(given = \"Hadley\",\n family = \"Wickham\",\n role = \"ctb\",\n email = \"hadley@posit.co\"),\n person(given = \"Matthew\",\n family = \"Lincoln\",\n role = \"ctb\",\n email = \"matthew.d.lincoln@gmail.com\"),\n person(given = \"Alessandro\",\n family = \"Gasparini\",\n role = \"ctb\",\n email = \"ag475@leicester.ac.uk\"),\n person(given = \"Lukasz\",\n family = \"Komsta\",\n role = \"ctb\",\n email = \"lukasz.komsta@umlub.pl\"),\n person(given = \"Frederick\",\n family = \"Novometsky\",\n role = \"ctb\"),\n person(given = \"Wilson\",\n family = \"Freitas\",\n role = \"ctb\"),\n person(given = \"Michelle\",\n family = \"Evans\",\n role = \"ctb\"),\n person(given = \"Jason Cory\",\n family = \"Brunson\",\n role = \"ctb\",\n email = \"cornelioid@gmail.com\"),\n person(given = \"Simon\",\n family = \"Jackson\",\n role = \"ctb\",\n email = \"drsimonjackson@gmail.com\"),\n person(given = \"Ben\",\n family = \"Whalley\",\n role = \"ctb\",\n email = \"ben.whalley@plymouth.ac.uk\"),\n person(given = \"Karissa\",\n family = \"Whiting\",\n role = \"ctb\",\n email = \"karissa.whiting@gmail.com\"),\n person(given = \"Yves\",\n family = \"Rosseel\",\n role = \"ctb\",\n email = \"yrosseel@gmail.com\"),\n person(given = \"Michael\",\n family = \"Kuehn\",\n role = \"ctb\",\n email = \"mkuehn10@gmail.com\"),\n person(given = \"Jorge\",\n family = \"Cimentada\",\n role = \"ctb\",\n email = \"cimentadaj@gmail.com\"),\n person(given = \"Erle\",\n family = \"Holgersen\",\n role = \"ctb\",\n email = \"erle.holgersen@gmail.com\"),\n person(given = \"Karl\",\n family = \"Dunkle Werner\",\n role = \"ctb\",\n comment = c(ORCID = \"0000-0003-0523-7309\")),\n person(given = \"Ethan\",\n family = \"Christensen\",\n role = \"ctb\",\n email = \"christensen.ej@gmail.com\"),\n person(given = \"Steven\",\n family = \"Pav\",\n role = \"ctb\",\n email = \"shabbychef@gmail.com\"),\n person(given = \"Paul\",\n family = \"PJ\",\n role = \"ctb\",\n email = \"pjpaul.stephens@gmail.com\"),\n person(given = \"Ben\",\n family = \"Schneider\",\n role = \"ctb\",\n email = \"benjamin.julius.schneider@gmail.com\"),\n person(given = \"Patrick\",\n family = \"Kennedy\",\n role = \"ctb\",\n email = \"pkqstr@protonmail.com\"),\n person(given = \"Lily\",\n family = \"Medina\",\n role = \"ctb\",\n email = \"lilymiru@gmail.com\"),\n person(given = \"Brian\",\n family = \"Fannin\",\n role = \"ctb\",\n email = \"captain@pirategrunt.com\"),\n person(given = \"Jason\",\n family = \"Muhlenkamp\",\n role = \"ctb\",\n email = \"jason.muhlenkamp@gmail.com\"),\n person(given = \"Matt\",\n family = \"Lehman\",\n role = \"ctb\"),\n person(given = \"Bill\",\n family = \"Denney\",\n role = \"ctb\",\n email = \"wdenney@humanpredictions.com\",\n comment = c(ORCID = \"0000-0002-5759-428X\")),\n person(given = \"Nic\",\n family = \"Crane\",\n role = \"ctb\"),\n person(given = \"Andrew\",\n family = \"Bates\",\n role = \"ctb\"),\n person(given = \"Vincent\",\n family = \"Arel-Bundock\",\n role = \"ctb\",\n email = \"vincent.arel-bundock@umontreal.ca\",\n comment = c(ORCID = \"0000-0003-2042-7063\")),\n person(given = \"Hideaki\",\n family = \"Hayashi\",\n role = \"ctb\"),\n person(given = \"Luis\",\n family = \"Tobalina\",\n role = \"ctb\"),\n person(given = \"Annie\",\n family = \"Wang\",\n role = \"ctb\",\n email = \"anniewang.uc@gmail.com\"),\n person(given = \"Wei Yang\",\n family = \"Tham\",\n role = \"ctb\",\n email = \"weiyang.tham@gmail.com\"),\n person(given = \"Clara\",\n family = \"Wang\",\n role = \"ctb\",\n email = \"clara.wang.94@gmail.com\"),\n person(given = \"Abby\",\n family = \"Smith\",\n role = \"ctb\",\n email = \"als1@u.northwestern.edu\",\n comment = c(ORCID = \"0000-0002-3207-0375\")),\n person(given = \"Jasper\",\n family = \"Cooper\",\n role = \"ctb\",\n email = \"jaspercooper@gmail.com\",\n comment = c(ORCID = \"0000-0002-8639-3188\")),\n person(given = \"E Auden\",\n family = \"Krauska\",\n role = \"ctb\",\n email = \"krauskae@gmail.com\",\n comment = c(ORCID = \"0000-0002-1466-5850\")),\n person(given = \"Alex\",\n family = \"Wang\",\n role = \"ctb\",\n email = \"x249wang@uwaterloo.ca\"),\n person(given = \"Malcolm\",\n family = \"Barrett\",\n role = \"ctb\",\n email = \"malcolmbarrett@gmail.com\",\n comment = c(ORCID = \"0000-0003-0299-5825\")),\n person(given = \"Charles\",\n family = \"Gray\",\n role = \"ctb\",\n email = \"charlestigray@gmail.com\",\n comment = c(ORCID = \"0000-0002-9978-011X\")),\n person(given = \"Jared\",\n family = \"Wilber\",\n role = \"ctb\"),\n person(given = \"Vilmantas\",\n family = \"Gegzna\",\n role = \"ctb\",\n email = \"GegznaV@gmail.com\",\n comment = c(ORCID = \"0000-0002-9500-5167\")),\n person(given = \"Eduard\",\n family = \"Szoecs\",\n role = \"ctb\",\n email = \"eduardszoecs@gmail.com\"),\n person(given = \"Frederik\",\n family = \"Aust\",\n role = \"ctb\",\n email = \"frederik.aust@uni-koeln.de\",\n comment = c(ORCID = \"0000-0003-4900-788X\")),\n person(given = \"Angus\",\n family = \"Moore\",\n role = \"ctb\",\n email = \"angusmoore9@gmail.com\"),\n person(given = \"Nick\",\n family = \"Williams\",\n role = \"ctb\",\n email = \"ntwilliams.personal@gmail.com\"),\n person(given = \"Marius\",\n family = \"Barth\",\n role = \"ctb\",\n email = \"marius.barth.uni.koeln@gmail.com\",\n comment = c(ORCID = \"0000-0002-3421-6665\")),\n person(given = \"Bruna\",\n family = \"Wundervald\",\n role = \"ctb\",\n email = \"brunadaviesw@gmail.com\",\n comment = c(ORCID = \"0000-0001-8163-220X\")),\n person(given = \"Joyce\",\n family = \"Cahoon\",\n role = \"ctb\",\n email = \"joyceyu48@gmail.com\",\n comment = c(ORCID = \"0000-0001-7217-4702\")),\n person(given = \"Grant\",\n family = \"McDermott\",\n role = \"ctb\",\n email = \"grantmcd@uoregon.edu\",\n comment = c(ORCID = \"0000-0001-7883-8573\")),\n person(given = \"Kevin\",\n family = \"Zarca\",\n role = \"ctb\",\n email = \"kevin.zarca@gmail.com\"),\n person(given = \"Shiro\",\n family = \"Kuriwaki\",\n role = \"ctb\",\n email = \"shirokuriwaki@gmail.com\",\n comment = c(ORCID = \"0000-0002-5687-2647\")),\n person(given = \"Lukas\",\n family = \"Wallrich\",\n role = \"ctb\",\n email = \"lukas.wallrich@gmail.com\",\n comment = c(ORCID = \"0000-0003-2121-5177\")),\n person(given = \"James\",\n family = \"Martherus\",\n role = \"ctb\",\n email = \"james@martherus.com\",\n comment = c(ORCID = \"0000-0002-8285-3300\")),\n person(given = \"Chuliang\",\n family = \"Xiao\",\n role = \"ctb\",\n email = \"cxiao@umich.edu\",\n comment = c(ORCID = \"0000-0002-8466-9398\")),\n person(given = \"Joseph\",\n family = \"Larmarange\",\n role = \"ctb\",\n email = \"joseph@larmarange.net\"),\n person(given = \"Max\",\n family = \"Kuhn\",\n role = \"ctb\",\n email = \"max@posit.co\"),\n person(given = \"Michal\",\n family = \"Bojanowski\",\n role = \"ctb\",\n email = \"michal2992@gmail.com\"),\n person(given = \"Hakon\",\n family = \"Malmedal\",\n role = \"ctb\",\n email = \"hmalmedal@gmail.com\"),\n person(given = \"Clara\",\n family = \"Wang\",\n role = \"ctb\"),\n person(given = \"Sergio\",\n family = \"Oller\",\n role = \"ctb\",\n email = \"sergioller@gmail.com\"),\n person(given = \"Luke\",\n family = \"Sonnet\",\n role = \"ctb\",\n email = \"luke.sonnet@gmail.com\"),\n person(given = \"Jim\",\n family = \"Hester\",\n role = \"ctb\",\n email = \"jim.hester@posit.co\"),\n person(given = \"Ben\",\n family = \"Schneider\",\n role = \"ctb\",\n email = \"benjamin.julius.schneider@gmail.com\"),\n person(given = \"Bernie\",\n family = \"Gray\",\n role = \"ctb\",\n email = \"bfgray3@gmail.com\",\n comment = c(ORCID = \"0000-0001-9190-6032\")),\n person(given = \"Mara\",\n family = \"Averick\",\n role = \"ctb\",\n email = \"mara@posit.co\"),\n person(given = \"Aaron\",\n family = \"Jacobs\",\n role = \"ctb\",\n email = \"atheriel@gmail.com\"),\n person(given = \"Andreas\",\n family = \"Bender\",\n role = \"ctb\",\n email = \"bender.at.R@gmail.com\"),\n person(given = \"Sven\",\n family = \"Templer\",\n role = \"ctb\",\n email = \"sven.templer@gmail.com\"),\n person(given = \"Paul-Christian\",\n family = \"Buerkner\",\n role = \"ctb\",\n email = \"paul.buerkner@gmail.com\"),\n person(given = \"Matthew\",\n family = \"Kay\",\n role = \"ctb\",\n email = \"mjskay@umich.edu\"),\n person(given = \"Erwan\",\n family = \"Le Pennec\",\n role = \"ctb\",\n email = \"lepennec@gmail.com\"),\n person(given = \"Johan\",\n family = \"Junkka\",\n role = \"ctb\",\n email = \"johan.junkka@umu.se\"),\n person(given = \"Hao\",\n family = \"Zhu\",\n role = \"ctb\",\n email = \"haozhu233@gmail.com\"),\n person(given = \"Benjamin\",\n family = \"Soltoff\",\n role = \"ctb\",\n email = \"soltoffbc@uchicago.edu\"),\n person(given = \"Zoe\",\n family = \"Wilkinson Saldana\",\n role = \"ctb\",\n email = \"zoewsaldana@gmail.com\"),\n person(given = \"Tyler\",\n family = \"Littlefield\",\n role = \"ctb\",\n email = \"tylurp1@gmail.com\"),\n person(given = \"Charles T.\",\n family = \"Gray\",\n role = \"ctb\",\n email = \"charlestigray@gmail.com\"),\n person(given = \"Shabbh E.\",\n family = \"Banks\",\n role = \"ctb\"),\n person(given = \"Serina\",\n family = \"Robinson\",\n role = \"ctb\",\n email = \"robi0916@umn.edu\"),\n person(given = \"Roger\",\n family = \"Bivand\",\n role = \"ctb\",\n email = \"Roger.Bivand@nhh.no\"),\n person(given = \"Riinu\",\n family = \"Ots\",\n role = \"ctb\",\n email = \"riinuots@gmail.com\"),\n person(given = \"Nicholas\",\n family = \"Williams\",\n role = \"ctb\",\n email = \"ntwilliams.personal@gmail.com\"),\n person(given = \"Nina\",\n family = \"Jakobsen\",\n role = \"ctb\"),\n person(given = \"Michael\",\n family = \"Weylandt\",\n role = \"ctb\",\n email = \"michael.weylandt@gmail.com\"),\n person(given = \"Lisa\",\n family = \"Lendway\",\n role = \"ctb\",\n email = \"llendway@macalester.edu\"),\n person(given = \"Karl\",\n family = \"Hailperin\",\n role = \"ctb\",\n email = \"khailper@gmail.com\"),\n person(given = \"Josue\",\n family = \"Rodriguez\",\n role = \"ctb\",\n email = \"jerrodriguez@ucdavis.edu\"),\n person(given = \"Jenny\",\n family = \"Bryan\",\n role = \"ctb\",\n email = \"jenny@posit.co\"),\n person(given = \"Chris\",\n family = \"Jarvis\",\n role = \"ctb\",\n email = \"Christopher1.jarvis@gmail.com\"),\n person(given = \"Greg\",\n family = \"Macfarlane\",\n role = \"ctb\",\n email = \"gregmacfarlane@gmail.com\"),\n person(given = \"Brian\",\n family = \"Mannakee\",\n role = \"ctb\",\n email = \"bmannakee@gmail.com\"),\n person(given = \"Drew\",\n family = \"Tyre\",\n role = \"ctb\",\n email = \"atyre2@unl.edu\"),\n person(given = \"Shreyas\",\n family = \"Singh\",\n role = \"ctb\",\n email = \"shreyas.singh.298@gmail.com\"),\n person(given = \"Laurens\",\n family = \"Geffert\",\n role = \"ctb\",\n email = \"laurensgeffert@gmail.com\"),\n person(given = \"Hong\",\n family = \"Ooi\",\n role = \"ctb\",\n email = \"hongooi@microsoft.com\"),\n person(given = \"Henrik\",\n family = \"Bengtsson\",\n role = \"ctb\",\n email = \"henrikb@braju.com\"),\n person(given = \"Eduard\",\n family = \"Szocs\",\n role = \"ctb\",\n email = \"eduardszoecs@gmail.com\"),\n person(given = \"David\",\n family = \"Hugh-Jones\",\n role = \"ctb\",\n email = \"davidhughjones@gmail.com\"),\n person(given = \"Matthieu\",\n family = \"Stigler\",\n role = \"ctb\",\n email = \"Matthieu.Stigler@gmail.com\"),\n person(given = \"Hugo\",\n family = \"Tavares\",\n role = \"ctb\",\n email = \"hm533@cam.ac.uk\",\n comment = c(ORCID = \"0000-0001-9373-2726\")),\n\t person(given = \"R. Willem\",\n family = \"Vervoort\",\n role = \"ctb\",\n email = \"Willemvervoort@gmail.com\"),\n person(given = \"Brenton M.\",\n family = \"Wiernik\",\n role = \"ctb\",\n email = \"brenton@wiernik.org\"),\n person(given = \"Josh\",\n family = \"Yamamoto\",\n role = \"ctb\",\n email = \"joshuayamamoto5@gmail.com\"),\n person(given = \"Jasme\",\n family = \"Lee\",\n role = \"ctb\"),\n person(given = \"Taren\",\n family = \"Sanders\",\n role = \"ctb\",\n email = \"taren.sanders@acu.edu.au\",\n comment = c(ORCID = \"0000-0002-4504-6008\")),\n person(given = \"Ilaria\",\n family = \"Prosdocimi\",\n role = \"ctb\",\n email = \"prosdocimi.ilaria@gmail.com\",\n comment = c(ORCID = \"0000-0001-8565-094X\")),\n person(given = \"Daniel D.\",\n family = \"Sjoberg\",\n role = \"ctb\",\n email = \"danield.sjoberg@gmail.com\",\n comment = c(ORCID = \"0000-0003-0862-2018\")),\n person(given = \"Alex\",\n family = \"Reinhart\",\n role = \"ctb\",\n email = \"areinhar@stat.cmu.edu\",\n comment = c(ORCID = \"0000-0002-6658-514X\")))", + "Description": "Summarizes key information about statistical\n objects in tidy tibbles. This makes it easy to report results, create\n plots and consistently work with large numbers of models at once.\n Broom provides three verbs that each provide different types of\n information about a model. tidy() summarizes information about model\n components such as coefficients of a regression. glance() reports\n information about an entire model, such as goodness of fit measures\n like AIC and BIC. augment() adds information about individual\n observations to a dataset, such as fitted values or influence\n measures.", + "License": "MIT + file LICENSE", + "URL": "https://broom.tidymodels.org/, https://github.com/tidymodels/broom", + "BugReports": "https://github.com/tidymodels/broom/issues", + "Depends": "R (>= 3.5)", + "Imports": "backports, cli, dplyr (>= 1.0.0), generics (>= 0.0.2), glue,\nlifecycle, purrr, rlang (>= 1.1.0), stringr, tibble (>= 3.0.0),\ntidyr (>= 1.0.0)", + "Suggests": "AER, AUC, bbmle, betareg (>= 3.2-1), biglm, binGroup, boot,\nbtergm (>= 1.10.6), car (>= 3.1-2), carData, caret, cluster,\ncmprsk, coda, covr, drc, e1071, emmeans, epiR, ergm (>=\n3.10.4), fixest (>= 0.9.0), gam (>= 1.15), gee, geepack,\nggplot2, glmnet, glmnetUtils, gmm, Hmisc, irlba, interp,\njoineRML, Kendall, knitr, ks, Lahman, lavaan (>= 0.6.18),\nleaps, lfe, lm.beta, lme4, lmodel2, lmtest (>= 0.9.38),\nlsmeans, maps, margins, MASS, mclust, mediation, metafor, mfx,\nmgcv, mlogit, modeldata, modeltests (>= 0.1.6), muhaz,\nmultcomp, network, nnet, ordinal, plm, poLCA, psych, quantreg,\nrmarkdown, robust, robustbase, rsample, sandwich, spdep (>=\n1.1), spatialreg, speedglm, spelling, survey, survival (>=\n3.6-4), systemfit, testthat (>= 3.0.0), tseries, vars, zoo", + "VignetteBuilder": "knitr", + "Config/Needs/website": "tidyverse/tidytemplate", + "Encoding": "UTF-8", + "RoxygenNote": "7.3.2", + "Language": "en-US", + "Collate": "'aaa-documentation-helper.R' 'null-and-default.R' 'aer.R'\n'auc.R' 'base.R' 'bbmle.R' 'betareg.R' 'biglm.R' 'bingroup.R'\n'boot.R' 'broom-package.R' 'broom.R' 'btergm.R' 'car.R'\n'caret.R' 'cluster.R' 'cmprsk.R' 'data-frame.R'\n'deprecated-0-7-0.R' 'drc.R' 'emmeans.R' 'epiR.R' 'ergm.R'\n'fixest.R' 'gam.R' 'geepack.R' 'glmnet-cv-glmnet.R'\n'glmnet-glmnet.R' 'gmm.R' 'hmisc.R'\n'import-standalone-obj-type.R'\n'import-standalone-types-check.R' 'joinerml.R' 'kendall.R'\n'ks.R' 'lavaan.R' 'leaps.R' 'lfe.R' 'list-irlba.R'\n'list-optim.R' 'list-svd.R' 'list-xyz.R' 'list.R' 'lm-beta.R'\n'lmodel2.R' 'lmtest.R' 'maps.R' 'margins.R' 'mass-fitdistr.R'\n'mass-negbin.R' 'mass-polr.R' 'mass-ridgelm.R' 'stats-lm.R'\n'mass-rlm.R' 'mclust.R' 'mediation.R' 'metafor.R' 'mfx.R'\n'mgcv.R' 'mlogit.R' 'muhaz.R' 'multcomp.R' 'nnet.R' 'nobs.R'\n'ordinal-clm.R' 'ordinal-clmm.R' 'plm.R' 'polca.R' 'psych.R'\n'stats-nls.R' 'quantreg-nlrq.R' 'quantreg-rq.R'\n'quantreg-rqs.R' 'robust-glmrob.R' 'robust-lmrob.R'\n'robustbase-glmrob.R' 'robustbase-lmrob.R' 'sp.R' 'spdep.R'\n'speedglm-speedglm.R' 'speedglm-speedlm.R' 'stats-anova.R'\n'stats-arima.R' 'stats-decompose.R' 'stats-factanal.R'\n'stats-glm.R' 'stats-htest.R' 'stats-kmeans.R' 'stats-loess.R'\n'stats-mlm.R' 'stats-prcomp.R' 'stats-smooth.spline.R'\n'stats-summary-lm.R' 'stats-time-series.R' 'survey.R'\n'survival-aareg.R' 'survival-cch.R' 'survival-coxph.R'\n'survival-pyears.R' 'survival-survdiff.R' 'survival-survexp.R'\n'survival-survfit.R' 'survival-survreg.R' 'systemfit.R'\n'tseries.R' 'utilities.R' 'vars.R' 'zoo.R' 'zzz.R'", + "Config/testthat/edition": "3", + "NeedsCompilation": "no", + "Packaged": "2025-03-27 19:21:46 UTC; simoncouch", + "Author": "David Robinson [aut],\n Alex Hayes [aut] (),\n Simon Couch [aut, cre] (),\n Posit Software, PBC [cph, fnd],\n Indrajeet Patil [ctb] (),\n Derek Chiu [ctb],\n Matthieu Gomez [ctb],\n Boris Demeshev [ctb],\n Dieter Menne [ctb],\n Benjamin Nutter [ctb],\n Luke Johnston [ctb],\n Ben Bolker [ctb],\n Francois Briatte [ctb],\n Jeffrey Arnold [ctb],\n Jonah Gabry [ctb],\n Luciano Selzer [ctb],\n Gavin Simpson [ctb],\n Jens Preussner [ctb],\n Jay Hesselberth [ctb],\n Hadley Wickham [ctb],\n Matthew Lincoln [ctb],\n Alessandro Gasparini [ctb],\n Lukasz Komsta [ctb],\n Frederick Novometsky [ctb],\n Wilson Freitas [ctb],\n Michelle Evans [ctb],\n Jason Cory Brunson [ctb],\n Simon Jackson [ctb],\n Ben Whalley [ctb],\n Karissa Whiting [ctb],\n Yves Rosseel [ctb],\n Michael Kuehn [ctb],\n Jorge Cimentada [ctb],\n Erle Holgersen [ctb],\n Karl Dunkle Werner [ctb] (),\n Ethan Christensen [ctb],\n Steven Pav [ctb],\n Paul PJ [ctb],\n Ben Schneider [ctb],\n Patrick Kennedy [ctb],\n Lily Medina [ctb],\n Brian Fannin [ctb],\n Jason Muhlenkamp [ctb],\n Matt Lehman [ctb],\n Bill Denney [ctb] (),\n Nic Crane [ctb],\n Andrew Bates [ctb],\n Vincent Arel-Bundock [ctb] (),\n Hideaki Hayashi [ctb],\n Luis Tobalina [ctb],\n Annie Wang [ctb],\n Wei Yang Tham [ctb],\n Clara Wang [ctb],\n Abby Smith [ctb] (),\n Jasper Cooper [ctb] (),\n E Auden Krauska [ctb] (),\n Alex Wang [ctb],\n Malcolm Barrett [ctb] (),\n Charles Gray [ctb] (),\n Jared Wilber [ctb],\n Vilmantas Gegzna [ctb] (),\n Eduard Szoecs [ctb],\n Frederik Aust [ctb] (),\n Angus Moore [ctb],\n Nick Williams [ctb],\n Marius Barth [ctb] (),\n Bruna Wundervald [ctb] (),\n Joyce Cahoon [ctb] (),\n Grant McDermott [ctb] (),\n Kevin Zarca [ctb],\n Shiro Kuriwaki [ctb] (),\n Lukas Wallrich [ctb] (),\n James Martherus [ctb] (),\n Chuliang Xiao [ctb] (),\n Joseph Larmarange [ctb],\n Max Kuhn [ctb],\n Michal Bojanowski [ctb],\n Hakon Malmedal [ctb],\n Clara Wang [ctb],\n Sergio Oller [ctb],\n Luke Sonnet [ctb],\n Jim Hester [ctb],\n Ben Schneider [ctb],\n Bernie Gray [ctb] (),\n Mara Averick [ctb],\n Aaron Jacobs [ctb],\n Andreas Bender [ctb],\n Sven Templer [ctb],\n Paul-Christian Buerkner [ctb],\n Matthew Kay [ctb],\n Erwan Le Pennec [ctb],\n Johan Junkka [ctb],\n Hao Zhu [ctb],\n Benjamin Soltoff [ctb],\n Zoe Wilkinson Saldana [ctb],\n Tyler Littlefield [ctb],\n Charles T. Gray [ctb],\n Shabbh E. Banks [ctb],\n Serina Robinson [ctb],\n Roger Bivand [ctb],\n Riinu Ots [ctb],\n Nicholas Williams [ctb],\n Nina Jakobsen [ctb],\n Michael Weylandt [ctb],\n Lisa Lendway [ctb],\n Karl Hailperin [ctb],\n Josue Rodriguez [ctb],\n Jenny Bryan [ctb],\n Chris Jarvis [ctb],\n Greg Macfarlane [ctb],\n Brian Mannakee [ctb],\n Drew Tyre [ctb],\n Shreyas Singh [ctb],\n Laurens Geffert [ctb],\n Hong Ooi [ctb],\n Henrik Bengtsson [ctb],\n Eduard Szocs [ctb],\n David Hugh-Jones [ctb],\n Matthieu Stigler [ctb],\n Hugo Tavares [ctb] (),\n R. Willem Vervoort [ctb],\n Brenton M. Wiernik [ctb],\n Josh Yamamoto [ctb],\n Jasme Lee [ctb],\n Taren Sanders [ctb] (),\n Ilaria Prosdocimi [ctb] (),\n Daniel D. Sjoberg [ctb] (),\n Alex Reinhart [ctb] ()", + "Maintainer": "Simon Couch ", + "Repository": "RSPM", + "Date/Publication": "2025-03-28 05:50:07 UTC", + "Built": "R 4.4.0; ; 2026-01-29 00:27:23 UTC; unix", + "RemotePkgRef": "broom@1.0.8", + "RemoteType": "standard", + "RemoteEtag": "\"3490906d20dae8252d875a0a0a4e6b13\"", + "RemotePackaged": "TRUE", + "RemoteRef": "broom", + "RemoteRepos": "https://packagemanager.posit.co/cran/latest", + "RemotePkgPlatform": "source", + "RemoteSha": "1.0.8" + } + }, + "broom.helpers": { + "Source": "CRAN", + "Repository": "https://packagemanager.posit.co/cran/latest", + "description": { + "Package": "broom.helpers", + "Title": "Helpers for Model Coefficients Tibbles", + "Version": "1.22.0", + "Authors@R": "c(\n person(\"Joseph\", \"Larmarange\", , \"joseph@larmarange.net\", role = c(\"aut\", \"cre\"),\n comment = c(ORCID = \"0000-0001-7097-700X\")),\n person(\"Daniel D.\", \"Sjoberg\", , \"danield.sjoberg@gmail.com\", role = \"aut\",\n comment = c(ORCID = \"0000-0003-0862-2018\"))\n )", + "Description": "Provides suite of functions to work with regression model\n 'broom::tidy()' tibbles. The suite includes functions to group\n regression model terms by variable, insert reference and header rows\n for categorical variables, add variable labels, and more.", + "License": "GPL (>= 3)", + "URL": "https://larmarange.github.io/broom.helpers/,\nhttps://github.com/larmarange/broom.helpers", + "BugReports": "https://github.com/larmarange/broom.helpers/issues", + "Depends": "R (>= 4.1)", + "Imports": "broom (>= 0.8), cards, cli, dplyr (>= 1.1.0), labelled,\nlifecycle, purrr, rlang (>= 1.0.1), stats, stringr, tibble,\ntidyr, tidyselect", + "Suggests": "betareg, biglm, brms (>= 2.13.0), broom.mixed, cmprsk, covr,\ndatasets, effects, emmeans, fixest (>= 0.10.0), forcats, gam,\ngee, geepack, ggplot2, ggeffects (>= 1.3.2), ggstats (>=\n0.2.1), glmmTMB, glmtoolbox, glue, gt, gtsummary (>= 2.0.0),\nknitr, lavaan, lfe, lme4 (>= 1.1.28), logitr (>= 0.8.0),\nmarginaleffects (>= 0.21.0), margins, MASS, mgcv, mice, mmrm\n(>= 0.3.6), multgee, nnet, ordinal, parameters, parsnip,\npatchwork, plm, pscl, quantreg, rmarkdown, rstanarm, scales,\nspelling, survey, survival, testthat (>= 3.0.0), tidycmprsk,\nVGAM, svyVGAM", + "VignetteBuilder": "knitr", + "RdMacros": "lifecycle", + "Encoding": "UTF-8", + "Language": "en-US", + "LazyData": "true", + "RoxygenNote": "7.3.3", + "Config/testthat/edition": "3", + "NeedsCompilation": "no", + "Packaged": "2025-09-17 09:06:13 UTC; josep", + "Author": "Joseph Larmarange [aut, cre] (ORCID:\n ),\n Daniel D. Sjoberg [aut] (ORCID:\n )", + "Maintainer": "Joseph Larmarange ", + "Repository": "RSPM", + "Date/Publication": "2025-09-17 10:00:02 UTC", + "Built": "R 4.4.0; ; 2026-01-29 00:32:16 UTC; unix", + "RemotePkgRef": "broom.helpers@1.22.0", + "RemoteType": "standard", + "RemoteEtag": "\"a255c2a85533507accfed085105da53b\"", + "RemotePackaged": "TRUE", + "RemoteRef": "broom.helpers", + "RemoteRepos": "https://packagemanager.posit.co/cran/latest", + "RemotePkgPlatform": "source", + "RemoteSha": "1.22.0" + } + }, + "bslib": { + "Source": "CRAN", + "Repository": "https://packagemanager.posit.co/cran/latest", + "description": { + "Package": "bslib", + "Title": "Custom 'Bootstrap' 'Sass' Themes for 'shiny' and 'rmarkdown'", + "Version": "0.9.0", + "Authors@R": "c(\n person(\"Carson\", \"Sievert\", , \"carson@posit.co\", role = c(\"aut\", \"cre\"),\n comment = c(ORCID = \"0000-0002-4958-2844\")),\n person(\"Joe\", \"Cheng\", , \"joe@posit.co\", role = \"aut\"),\n person(\"Garrick\", \"Aden-Buie\", , \"garrick@posit.co\", role = \"aut\",\n comment = c(ORCID = \"0000-0002-7111-0077\")),\n person(\"Posit Software, PBC\", role = c(\"cph\", \"fnd\")),\n person(, \"Bootstrap contributors\", role = \"ctb\",\n comment = \"Bootstrap library\"),\n person(, \"Twitter, Inc\", role = \"cph\",\n comment = \"Bootstrap library\"),\n person(\"Javi\", \"Aguilar\", role = c(\"ctb\", \"cph\"),\n comment = \"Bootstrap colorpicker library\"),\n person(\"Thomas\", \"Park\", role = c(\"ctb\", \"cph\"),\n comment = \"Bootswatch library\"),\n person(, \"PayPal\", role = c(\"ctb\", \"cph\"),\n comment = \"Bootstrap accessibility plugin\")\n )", + "Description": "Simplifies custom 'CSS' styling of both 'shiny' and\n 'rmarkdown' via 'Bootstrap' 'Sass'. Supports 'Bootstrap' 3, 4 and 5 as\n well as their various 'Bootswatch' themes. An interactive widget is\n also provided for previewing themes in real time.", + "License": "MIT + file LICENSE", + "URL": "https://rstudio.github.io/bslib/, https://github.com/rstudio/bslib", + "BugReports": "https://github.com/rstudio/bslib/issues", + "Depends": "R (>= 2.10)", + "Imports": "base64enc, cachem, fastmap (>= 1.1.1), grDevices, htmltools\n(>= 0.5.8), jquerylib (>= 0.1.3), jsonlite, lifecycle, memoise\n(>= 2.0.1), mime, rlang, sass (>= 0.4.9)", + "Suggests": "bsicons, curl, fontawesome, future, ggplot2, knitr, magrittr,\nrappdirs, rmarkdown (>= 2.7), shiny (> 1.8.1), testthat,\nthematic, tools, utils, withr, yaml", + "Config/Needs/deploy": "BH, chiflights22, colourpicker, commonmark, cpp11,\ncpsievert/chiflights22, cpsievert/histoslider, dplyr, DT,\nggplot2, ggridges, gt, hexbin, histoslider, htmlwidgets,\nlattice, leaflet, lubridate, markdown, modelr, plotly,\nreactable, reshape2, rprojroot, rsconnect, rstudio/shiny,\nscales, styler, tibble", + "Config/Needs/routine": "chromote, desc, renv", + "Config/Needs/website": "brio, crosstalk, dplyr, DT, ggplot2, glue,\nhtmlwidgets, leaflet, lorem, palmerpenguins, plotly, purrr,\nrprojroot, rstudio/htmltools, scales, stringr, tidyr, webshot2", + "Config/testthat/edition": "3", + "Config/testthat/parallel": "true", + "Config/testthat/start-first": "zzzz-bs-sass, fonts, zzz-precompile,\ntheme-*, rmd-*", + "Encoding": "UTF-8", + "RoxygenNote": "7.3.2", + "Collate": "'accordion.R' 'breakpoints.R' 'bs-current-theme.R'\n'bs-dependencies.R' 'bs-global.R' 'bs-remove.R'\n'bs-theme-layers.R' 'bs-theme-preset-bootswatch.R'\n'bs-theme-preset-brand.R' 'bs-theme-preset-builtin.R'\n'bs-theme-preset.R' 'utils.R' 'bs-theme-preview.R'\n'bs-theme-update.R' 'bs-theme.R' 'bslib-package.R' 'buttons.R'\n'card.R' 'deprecated.R' 'files.R' 'fill.R' 'imports.R'\n'input-dark-mode.R' 'input-switch.R' 'layout.R' 'nav-items.R'\n'nav-update.R' 'navbar_options.R' 'navs-legacy.R' 'navs.R'\n'onLoad.R' 'page.R' 'popover.R' 'precompiled.R' 'print.R'\n'shiny-devmode.R' 'sidebar.R' 'staticimports.R' 'tooltip.R'\n'utils-deps.R' 'utils-shiny.R' 'utils-tags.R' 'value-box.R'\n'version-default.R' 'versions.R'", + "NeedsCompilation": "no", + "Packaged": "2025-01-30 22:04:52 UTC; garrick", + "Author": "Carson Sievert [aut, cre] (),\n Joe Cheng [aut],\n Garrick Aden-Buie [aut] (),\n Posit Software, PBC [cph, fnd],\n Bootstrap contributors [ctb] (Bootstrap library),\n Twitter, Inc [cph] (Bootstrap library),\n Javi Aguilar [ctb, cph] (Bootstrap colorpicker library),\n Thomas Park [ctb, cph] (Bootswatch library),\n PayPal [ctb, cph] (Bootstrap accessibility plugin)", + "Maintainer": "Carson Sievert ", + "Repository": "RSPM", + "Date/Publication": "2025-01-30 23:20:02 UTC", + "Built": "R 4.4.0; ; 2026-01-29 00:29:30 UTC; unix", + "RemotePkgRef": "bslib@0.9.0", + "RemoteType": "standard", + "RemoteEtag": "\"b4e388e8f37710d768c5b3bd7e38aff4\"", + "RemotePackaged": "TRUE", + "RemoteRef": "bslib", + "RemoteRepos": "https://packagemanager.posit.co/cran/latest", + "RemotePkgPlatform": "source", + "RemoteSha": "0.9.0" + } + }, + "cachem": { + "Source": "CRAN", + "Repository": "https://packagemanager.posit.co/cran/latest", + "description": { + "Package": "cachem", + "Version": "1.1.0", + "Title": "Cache R Objects with Automatic Pruning", + "Description": "Key-value stores with automatic pruning. Caches can limit\n either their total size or the age of the oldest object (or both),\n automatically pruning objects to maintain the constraints.", + "Authors@R": "c(\n person(\"Winston\", \"Chang\", , \"winston@posit.co\", c(\"aut\", \"cre\")),\n person(family = \"Posit Software, PBC\", role = c(\"cph\", \"fnd\")))", + "License": "MIT + file LICENSE", + "Encoding": "UTF-8", + "ByteCompile": "true", + "URL": "https://cachem.r-lib.org/, https://github.com/r-lib/cachem", + "Imports": "rlang, fastmap (>= 1.2.0)", + "Suggests": "testthat", + "RoxygenNote": "7.2.3", + "Config/Needs/routine": "lobstr", + "Config/Needs/website": "pkgdown", + "NeedsCompilation": "yes", + "Packaged": "2024-05-15 15:54:22 UTC; winston", + "Author": "Winston Chang [aut, cre],\n Posit Software, PBC [cph, fnd]", + "Maintainer": "Winston Chang ", + "Repository": "RSPM", + "Date/Publication": "2024-05-16 09:50:11 UTC", + "Built": "R 4.4.0; x86_64-pc-linux-gnu; 2026-01-29 00:23:04 UTC; unix", + "RemoteType": "standard", + "RemotePkgRef": "cachem", + "RemoteRef": "cachem", + "RemoteRepos": "https://packagemanager.posit.co/cran/latest", + "RemotePkgPlatform": "source", + "RemoteSha": "1.1.0" + } + }, + "callr": { + "Source": "CRAN", + "Repository": "https://packagemanager.posit.co/cran/latest", + "description": { + "Package": "callr", + "Title": "Call R from R", + "Version": "3.7.6", + "Authors@R": "c(\n person(\"Gábor\", \"Csárdi\", , \"csardi.gabor@gmail.com\", role = c(\"aut\", \"cre\", \"cph\"),\n comment = c(ORCID = \"0000-0001-7098-9676\")),\n person(\"Winston\", \"Chang\", role = \"aut\"),\n person(\"Posit Software, PBC\", role = c(\"cph\", \"fnd\")),\n person(\"Ascent Digital Services\", role = c(\"cph\", \"fnd\"))\n )", + "Description": "It is sometimes useful to perform a computation in a separate\n R process, without affecting the current R process at all. This\n packages does exactly that.", + "License": "MIT + file LICENSE", + "URL": "https://callr.r-lib.org, https://github.com/r-lib/callr", + "BugReports": "https://github.com/r-lib/callr/issues", + "Depends": "R (>= 3.4)", + "Imports": "processx (>= 3.6.1), R6, utils", + "Suggests": "asciicast (>= 2.3.1), cli (>= 1.1.0), mockery, ps, rprojroot,\nspelling, testthat (>= 3.2.0), withr (>= 2.3.0)", + "Config/Needs/website": "r-lib/asciicast, glue, htmlwidgets, igraph,\ntibble, tidyverse/tidytemplate", + "Config/testthat/edition": "3", + "Encoding": "UTF-8", + "Language": "en-US", + "RoxygenNote": "7.3.1.9000", + "NeedsCompilation": "no", + "Packaged": "2024-03-25 12:10:25 UTC; gaborcsardi", + "Author": "Gábor Csárdi [aut, cre, cph] (),\n Winston Chang [aut],\n Posit Software, PBC [cph, fnd],\n Ascent Digital Services [cph, fnd]", + "Maintainer": "Gábor Csárdi ", + "Repository": "RSPM", + "Date/Publication": "2024-03-25 13:30:06 UTC", + "Built": "R 4.4.0; ; 2026-01-29 00:23:13 UTC; unix", + "RemoteType": "standard", + "RemotePkgRef": "callr", + "RemoteRef": "callr", + "RemoteRepos": "https://packagemanager.posit.co/cran/latest", + "RemotePkgPlatform": "source", + "RemoteSha": "3.7.6" + } + }, + "cards": { + "Source": "CRAN", + "Repository": "https://packagemanager.posit.co/cran/latest", + "description": { + "Package": "cards", + "Title": "Analysis Results Data", + "Version": "0.7.0", + "Authors@R": "c(\n person(\"Daniel D.\", \"Sjoberg\", , \"danield.sjoberg@gmail.com\", role = c(\"aut\", \"cre\"),\n comment = c(ORCID = \"0000-0003-0862-2018\")),\n person(\"Becca\", \"Krouse\", , \"becca.z.krouse@gsk.com\", role = \"aut\"),\n person(\"Emily\", \"de la Rua\", , \"emily.de_la_rua@contractors.roche.com\", role = \"aut\",\n comment = c(ORCID = \"0009-0000-8738-5561\")),\n person(\"Malan\", \"Bosman\", , \"malanbos@gmail.com\", role = \"aut\",\n comment = c(ORCID = \"0000-0002-3020-195X\")),\n person(\"F. Hoffmann-La Roche AG\", role = c(\"cph\", \"fnd\")),\n person(\"GlaxoSmithKline Research & Development Limited\", role = \"cph\")\n )", + "Description": "Construct CDISC (Clinical Data Interchange Standards\n Consortium) compliant Analysis Results Data objects. These objects are\n used and re-used to construct summary tables, visualizations, and\n written reports. The package also exports utilities for working with\n these objects and creating new Analysis Results Data objects.", + "License": "Apache License 2.0", + "URL": "https://github.com/insightsengineering/cards,\nhttps://insightsengineering.github.io/cards/", + "BugReports": "https://github.com/insightsengineering/cards/issues", + "Depends": "R (>= 4.1)", + "Imports": "cli (>= 3.6.1), dplyr (>= 1.1.2), glue (>= 1.6.2), lifecycle\n(>= 1.0.3), rlang (>= 1.1.1), tidyr (>= 1.3.0), tidyselect (>=\n1.2.0)", + "Suggests": "testthat (>= 3.2.0), withr (>= 3.0.0)", + "Config/Needs/coverage": "hms", + "Config/Needs/website": "rmarkdown, jsonlite, yaml, gtsummary, tfrmt,\ncardx, gt, fontawesome, insightsengineering/crane,\ninsightsengineering/nesttemplate", + "Config/testthat/edition": "3", + "Config/testthat/parallel": "true", + "Encoding": "UTF-8", + "Language": "en-US", + "LazyData": "true", + "RoxygenNote": "7.3.2", + "NeedsCompilation": "no", + "Packaged": "2025-08-27 04:37:58 UTC; sjobergd", + "Author": "Daniel D. Sjoberg [aut, cre] (ORCID:\n ),\n Becca Krouse [aut],\n Emily de la Rua [aut] (ORCID: ),\n Malan Bosman [aut] (ORCID: ),\n F. Hoffmann-La Roche AG [cph, fnd],\n GlaxoSmithKline Research & Development Limited [cph]", + "Maintainer": "Daniel D. Sjoberg ", + "Repository": "RSPM", + "Date/Publication": "2025-08-27 07:30:02 UTC", + "Built": "R 4.4.0; ; 2026-01-29 00:27:23 UTC; unix", + "RemotePkgRef": "cards@0.7.0", + "RemoteType": "standard", + "RemoteEtag": "\"0b6e383aeba81422f8902f0ca6f2cc44\"", + "RemotePackaged": "TRUE", + "RemoteRef": "cards", + "RemoteRepos": "https://packagemanager.posit.co/cran/latest", + "RemotePkgPlatform": "source", + "RemoteSha": "0.7.0" + } + }, + "cardx": { + "Source": "CRAN", + "Repository": "https://packagemanager.posit.co/cran/latest", + "description": { + "Package": "cardx", + "Title": "Extra Analysis Results Data Utilities", + "Version": "0.3.0", + "Authors@R": "c(\n person(\"Daniel D.\", \"Sjoberg\", , \"danield.sjoberg@gmail.com\", role = c(\"aut\", \"cre\"),\n comment = c(ORCID = \"0000-0003-0862-2018\")),\n person(\"Abinaya\", \"Yogasekaram\", , \"abinaya.yogasekaram@contractors.roche.com\", role = \"aut\"),\n person(\"Emily\", \"de la Rua\", , \"emily.de_la_rua@contractors.roche.com\", role = \"aut\"),\n person(\"Malcolm\", \"Barrett\", role = \"ctb\",\n comment = c(ORCID = \"0000-0003-0299-5825\")),\n person(\"F. Hoffmann-La Roche AG\", role = c(\"cph\", \"fnd\"))\n )", + "Description": "Create extra Analysis Results Data (ARD) summary objects.\n The package supplements the simple ARD functions from the 'cards'\n package, exporting functions to put statistical results in the ARD\n format. These objects are used and re-used to construct summary\n tables, visualizations, and written reports.", + "License": "Apache License 2.0", + "URL": "https://github.com/insightsengineering/cardx,\nhttps://insightsengineering.github.io/cardx/", + "BugReports": "https://github.com/insightsengineering/cardx/issues", + "Depends": "R (>= 4.2)", + "Imports": "cards (>= 0.7.0), cli (>= 3.6.1), dplyr (>= 1.1.2), glue (>=\n1.6.2), lifecycle (>= 1.0.3), rlang (>= 1.1.1), tidyr (>=\n1.3.0)", + "Suggests": "aod (>= 1.3.3), broom (>= 1.0.8), broom.helpers (>= 1.17.0),\nbroom.mixed (>= 0.2.9), car (>= 3.1-2), effectsize (>= 0.8.8),\nemmeans (>= 1.7.3), geepack (>= 1.3.2), ggsurvfit (>= 1.1.0),\nlme4 (>= 1.1-37), parameters (>= 0.20.2), smd (>= 0.6.6),\nsurvey (>= 4.2), survival (>= 3.6-4), testthat (>= 3.2.0),\nwithr (>= 2.5.0)", + "Config/Needs/website": "insightsengineering/nesttemplate", + "Config/testthat/edition": "3", + "Config/testthat/parallel": "true", + "Encoding": "UTF-8", + "Language": "en-US", + "RoxygenNote": "7.3.2", + "NeedsCompilation": "no", + "Packaged": "2025-08-27 14:13:53 UTC; sjobergd", + "Author": "Daniel D. Sjoberg [aut, cre] (ORCID:\n ),\n Abinaya Yogasekaram [aut],\n Emily de la Rua [aut],\n Malcolm Barrett [ctb] (ORCID: ),\n F. Hoffmann-La Roche AG [cph, fnd]", + "Maintainer": "Daniel D. Sjoberg ", + "Repository": "RSPM", + "Date/Publication": "2025-08-27 14:40:02 UTC", + "Built": "R 4.4.0; ; 2026-01-29 00:27:37 UTC; unix", + "RemotePkgRef": "cardx@0.3.0", + "RemoteType": "standard", + "RemoteEtag": "\"89d533fb18fcca68233a15a5ac22bb4e\"", + "RemotePackaged": "TRUE", + "RemoteRef": "cardx", + "RemoteRepos": "https://packagemanager.posit.co/cran/latest", + "RemotePkgPlatform": "source", + "RemoteSha": "0.3.0" + } + }, + "cellranger": { + "Source": "CRAN", + "Repository": "https://packagemanager.posit.co/cran/latest", + "description": { + "Package": "cellranger", + "Title": "Translate Spreadsheet Cell Ranges to Rows and Columns", + "Version": "1.1.0", + "Authors@R": "c(\n person(\"Jennifer\", \"Bryan\", , \"jenny@stat.ubc.ca\", c(\"cre\", \"aut\")),\n person(\"Hadley\", \"Wickham\", , \"hadley@rstudio.com\", \"ctb\")\n )", + "Description": "Helper functions to work with spreadsheets and the \"A1:D10\" style\n of cell range specification.", + "Depends": "R (>= 3.0.0)", + "License": "MIT + file LICENSE", + "LazyData": "true", + "URL": "https://github.com/rsheets/cellranger", + "BugReports": "https://github.com/rsheets/cellranger/issues", + "Suggests": "covr, testthat (>= 1.0.0), knitr, rmarkdown", + "RoxygenNote": "5.0.1.9000", + "VignetteBuilder": "knitr", + "Imports": "rematch, tibble", + "NeedsCompilation": "no", + "Packaged": "2016-07-26 06:50:00 UTC; jenny", + "Author": "Jennifer Bryan [cre, aut],\n Hadley Wickham [ctb]", + "Maintainer": "Jennifer Bryan ", + "Repository": "RSPM", + "Date/Publication": "2016-07-27 03:17:48", + "Encoding": "UTF-8", + "Built": "R 4.4.0; ; 2026-01-29 00:26:10 UTC; unix", + "RemotePkgRef": "cellranger@1.1.0", + "RemoteType": "standard", + "RemoteEtag": "\"aaca65619d652d20258104b5e8107e54\"", + "RemotePackaged": "TRUE", + "RemoteRef": "cellranger", + "RemoteRepos": "https://packagemanager.posit.co/cran/latest", + "RemotePkgPlatform": "source", + "RemoteSha": "1.1.0" + } + }, + "cicerone": { + "Source": "CRAN", + "Repository": "https://packagemanager.posit.co/cran/latest", + "description": { + "Package": "cicerone", + "Title": "Provide Tours of 'Shiny' Applications", + "Version": "1.0.4", + "Date": "2021-01-10", + "Authors@R": "\n c(\n person(given = \"John\",\n family = \"Coene\",\n role = c(\"aut\", \"cre\"),\n email = \"jcoenep@gmail.com\",\n comment = c(ORCID = \"0000-0002-6637-4107\")),\n person(given = \"Etienne\", \n family = \"Bacher\", \n role = \"ctb\", \n email = \"etienne.bacher@protonmail.com\")\n )", + "Description": "Provide step by step guided tours of 'Shiny' applications.", + "License": "MIT + file LICENSE", + "Encoding": "UTF-8", + "LazyData": "true", + "Imports": "R6, shiny, assertthat", + "RoxygenNote": "7.1.1.9000", + "URL": "https://cicerone.john-coene.com/", + "BugReports": "https://github.com/JohnCoene/cicerone/issues", + "NeedsCompilation": "no", + "Packaged": "2021-01-10 22:10:19 UTC; jp", + "Author": "John Coene [aut, cre] (),\n Etienne Bacher [ctb]", + "Maintainer": "John Coene ", + "Repository": "RSPM", + "Date/Publication": "2021-01-10 23:00:02 UTC", + "Built": "R 4.4.0; ; 2026-01-29 00:30:25 UTC; unix", + "RemotePkgRef": "cicerone@1.0.4", + "RemoteType": "standard", + "RemoteEtag": "\"d2970ac168c0914bc9924713bdc39343\"", + "RemotePackaged": "TRUE", + "RemoteRef": "cicerone", + "RemoteRepos": "https://packagemanager.posit.co/cran/latest", + "RemotePkgPlatform": "source", + "RemoteSha": "1.0.4" + } + }, + "cli": { + "Source": "CRAN", + "Repository": "https://packagemanager.posit.co/cran/latest", + "description": { + "Package": "cli", + "Title": "Helpers for Developing Command Line Interfaces", + "Version": "3.6.4", + "Authors@R": "c(\n person(\"Gábor\", \"Csárdi\", , \"gabor@posit.co\", role = c(\"aut\", \"cre\")),\n person(\"Hadley\", \"Wickham\", role = \"ctb\"),\n person(\"Kirill\", \"Müller\", role = \"ctb\"),\n person(\"Salim\", \"Brüggemann\", , \"salim-b@pm.me\", role = \"ctb\",\n comment = c(ORCID = \"0000-0002-5329-5987\")),\n person(\"Posit Software, PBC\", role = c(\"cph\", \"fnd\"))\n )", + "Description": "A suite of tools to build attractive command line interfaces\n ('CLIs'), from semantic elements: headings, lists, alerts, paragraphs,\n etc. Supports custom themes via a 'CSS'-like language. It also\n contains a number of lower level 'CLI' elements: rules, boxes, trees,\n and 'Unicode' symbols with 'ASCII' alternatives. It support ANSI\n colors and text styles as well.", + "License": "MIT + file LICENSE", + "URL": "https://cli.r-lib.org, https://github.com/r-lib/cli", + "BugReports": "https://github.com/r-lib/cli/issues", + "Depends": "R (>= 3.4)", + "Imports": "utils", + "Suggests": "callr, covr, crayon, digest, glue (>= 1.6.0), grDevices,\nhtmltools, htmlwidgets, knitr, methods, processx, ps (>=\n1.3.4.9000), rlang (>= 1.0.2.9003), rmarkdown, rprojroot,\nrstudioapi, testthat (>= 3.2.0), tibble, whoami, withr", + "Config/Needs/website": "r-lib/asciicast, bench, brio, cpp11, decor, desc,\nfansi, prettyunits, sessioninfo, tidyverse/tidytemplate,\nusethis, vctrs", + "Config/testthat/edition": "3", + "Encoding": "UTF-8", + "RoxygenNote": "7.3.2", + "NeedsCompilation": "yes", + "Packaged": "2025-02-11 21:14:07 UTC; gaborcsardi", + "Author": "Gábor Csárdi [aut, cre],\n Hadley Wickham [ctb],\n Kirill Müller [ctb],\n Salim Brüggemann [ctb] (),\n Posit Software, PBC [cph, fnd]", + "Maintainer": "Gábor Csárdi ", + "Repository": "RSPM", + "Date/Publication": "2025-02-13 05:20:02 UTC", + "Built": "R 4.4.0; x86_64-pc-linux-gnu; 2026-01-29 00:22:18 UTC; unix", + "RemotePkgRef": "cli@3.6.4", + "RemoteType": "standard", + "RemoteEtag": "\"48e641b5066b20ace37ebe004e899e32\"", + "RemotePackaged": "TRUE", + "RemoteRef": "cli", + "RemoteRepos": "https://packagemanager.posit.co/cran/latest", + "RemotePkgPlatform": "source", + "RemoteSha": "3.6.4" + } + }, + "clipr": { + "Source": "CRAN", + "Repository": "https://packagemanager.posit.co/cran/latest", + "description": { + "Type": "Package", + "Package": "clipr", + "Title": "Read and Write from the System Clipboard", + "Version": "0.8.0", + "Authors@R": "c(\n person(\"Matthew\", \"Lincoln\", , \"matthew.d.lincoln@gmail.com\", role = c(\"aut\", \"cre\"),\n comment = c(ORCID = \"0000-0002-4387-3384\")),\n person(\"Louis\", \"Maddox\", role = \"ctb\"),\n person(\"Steve\", \"Simpson\", role = \"ctb\"),\n person(\"Jennifer\", \"Bryan\", role = \"ctb\")\n )", + "Description": "Simple utility functions to read from and write to\n the Windows, OS X, and X11 clipboards.", + "License": "GPL-3", + "URL": "https://github.com/mdlincoln/clipr,\nhttp://matthewlincoln.net/clipr/", + "BugReports": "https://github.com/mdlincoln/clipr/issues", + "Imports": "utils", + "Suggests": "covr, knitr, rmarkdown, rstudioapi (>= 0.5), testthat (>=\n2.0.0)", + "VignetteBuilder": "knitr", + "Encoding": "UTF-8", + "Language": "en-US", + "RoxygenNote": "7.1.2", + "SystemRequirements": "xclip (https://github.com/astrand/xclip) or xsel\n(http://www.vergenet.net/~conrad/software/xsel/) for accessing\nthe X11 clipboard, or wl-clipboard\n(https://github.com/bugaevc/wl-clipboard) for systems using\nWayland.", + "NeedsCompilation": "no", + "Packaged": "2022-02-19 02:20:21 UTC; mlincoln", + "Author": "Matthew Lincoln [aut, cre] (),\n Louis Maddox [ctb],\n Steve Simpson [ctb],\n Jennifer Bryan [ctb]", + "Maintainer": "Matthew Lincoln ", + "Repository": "RSPM", + "Date/Publication": "2022-02-22 00:58:45 UTC", + "Built": "R 4.4.0; ; 2026-01-29 00:21:05 UTC; unix", + "RemotePkgRef": "clipr@0.8.0", + "RemoteType": "standard", + "RemoteEtag": "\"9aedce63b6b5d2942431d735f5512a20\"", + "RemotePackaged": "TRUE", + "RemoteRef": "clipr", + "RemoteRepos": "https://packagemanager.posit.co/cran/latest", + "RemotePkgPlatform": "source", + "RemoteSha": "0.8.0" + } + }, + "commonmark": { + "Source": "CRAN", + "Repository": "https://packagemanager.posit.co/cran/latest", + "description": { + "Package": "commonmark", + "Type": "Package", + "Title": "High Performance CommonMark and Github Markdown Rendering in R", + "Version": "1.9.5", + "Authors@R": "c(\n person(\"Jeroen\", \"Ooms\", ,\"jeroenooms@gmail.com\", role = c(\"aut\", \"cre\"),\n comment = c(ORCID = \"0000-0002-4035-0289\")),\n person(\"John MacFarlane\", role = \"cph\", comment = \"Author of cmark\"))", + "Description": "The CommonMark specification defines\n a rationalized version of markdown syntax. This package uses the 'cmark' \n reference implementation for converting markdown text into various formats\n including html, latex and groff man. In addition it exposes the markdown\n parse tree in xml format. Also includes opt-in support for GFM extensions\n including tables, autolinks, and strikethrough text.", + "License": "BSD_2_clause + file LICENSE", + "URL": "https://docs.ropensci.org/commonmark/\nhttps://ropensci.r-universe.dev/commonmark", + "BugReports": "https://github.com/r-lib/commonmark/issues", + "Suggests": "curl, testthat, xml2", + "RoxygenNote": "7.3.2", + "Language": "en-US", + "Encoding": "UTF-8", + "NeedsCompilation": "yes", + "Packaged": "2025-03-17 15:28:44 UTC; jeroen", + "Author": "Jeroen Ooms [aut, cre] (),\n John MacFarlane [cph] (Author of cmark)", + "Maintainer": "Jeroen Ooms ", + "Repository": "RSPM", + "Date/Publication": "2025-03-17 16:30:02 UTC", + "Built": "R 4.4.0; x86_64-pc-linux-gnu; 2026-01-29 00:21:56 UTC; unix", + "RemotePkgRef": "commonmark@1.9.5", + "RemoteType": "standard", + "RemoteEtag": "\"c0a28d84b07a56624382511efa8ea368\"", + "RemotePackaged": "TRUE", + "RemoteRef": "commonmark", + "RemoteRepos": "https://packagemanager.posit.co/cran/latest", + "RemotePkgPlatform": "source", + "RemoteSha": "1.9.5" + } + }, + "config": { + "Source": "CRAN", + "Repository": "https://packagemanager.posit.co/cran/latest", + "description": { + "Package": "config", + "Type": "Package", + "Title": "Manage Environment Specific Configuration Values", + "Version": "0.3.2", + "Authors@R": "c(\n person(\"JJ\", \"Allaire\", role = c(\"aut\"), email = \"jj@rstudio.com\"),\n person(\"Andrie\", \"de Vries\", role = \"cre\", email = \"apdevries@gmail.com\"),\n person(\"Posit Software, PBC\", role = c(\"cph\", \"fnd\"))\n )", + "Imports": "yaml (>= 2.1.19)", + "Suggests": "testthat, knitr, rmarkdown, covr, spelling, withr", + "Description": "Manage configuration values across multiple environments (e.g.\n development, test, production). Read values using a function that determines\n the current environment and returns the appropriate value.", + "License": "GPL-3", + "URL": "https://rstudio.github.io/config/,\nhttps://github.com/rstudio/config", + "BugReports": "https://github.com/rstudio/config/issues", + "RoxygenNote": "7.2.3", + "VignetteBuilder": "knitr", + "Encoding": "UTF-8", + "Language": "en-US", + "Config/testthat/edition": "3", + "NeedsCompilation": "no", + "Packaged": "2023-08-30 09:28:23 UTC; apdev", + "Author": "JJ Allaire [aut],\n Andrie de Vries [cre],\n Posit Software, PBC [cph, fnd]", + "Maintainer": "Andrie de Vries ", + "Repository": "RSPM", + "Date/Publication": "2023-08-30 16:50:36 UTC", + "Built": "R 4.4.0; ; 2026-01-29 00:24:47 UTC; unix", + "RemoteType": "standard", + "RemotePkgRef": "config", + "RemoteRef": "config", + "RemoteRepos": "https://packagemanager.posit.co/cran/latest", + "RemotePkgPlatform": "source", + "RemoteSha": "0.3.2" + } + }, + "cpp11": { + "Source": "CRAN", + "Repository": "https://packagemanager.posit.co/cran/latest", + "description": { + "Package": "cpp11", + "Title": "A C++11 Interface for R's C Interface", + "Version": "0.5.2", + "Authors@R": "\n c(\n person(\"Davis\", \"Vaughan\", email = \"davis@posit.co\", role = c(\"aut\", \"cre\"), comment = c(ORCID = \"0000-0003-4777-038X\")),\n person(\"Jim\",\"Hester\", role = \"aut\", comment = c(ORCID = \"0000-0002-2739-7082\")),\n person(\"Romain\", \"François\", role = \"aut\", comment = c(ORCID = \"0000-0002-2444-4226\")),\n person(\"Benjamin\", \"Kietzman\", role = \"ctb\"),\n person(\"Posit Software, PBC\", role = c(\"cph\", \"fnd\"))\n )", + "Description": "Provides a header only, C++11 interface to R's C\n interface. Compared to other approaches 'cpp11' strives to be safe\n against long jumps from the C API as well as C++ exceptions, conform\n to normal R function semantics and supports interaction with 'ALTREP'\n vectors.", + "License": "MIT + file LICENSE", + "URL": "https://cpp11.r-lib.org, https://github.com/r-lib/cpp11", + "BugReports": "https://github.com/r-lib/cpp11/issues", + "Depends": "R (>= 4.0.0)", + "Suggests": "bench, brio, callr, cli, covr, decor, desc, ggplot2, glue,\nknitr, lobstr, mockery, progress, rmarkdown, scales, Rcpp,\ntestthat (>= 3.2.0), tibble, utils, vctrs, withr", + "VignetteBuilder": "knitr", + "Config/Needs/website": "tidyverse/tidytemplate", + "Config/testthat/edition": "3", + "Config/Needs/cpp11/cpp_register": "brio, cli, decor, desc, glue, tibble,\nvctrs", + "Encoding": "UTF-8", + "RoxygenNote": "7.3.2", + "NeedsCompilation": "no", + "Packaged": "2025-03-03 22:24:28 UTC; davis", + "Author": "Davis Vaughan [aut, cre] (),\n Jim Hester [aut] (),\n Romain François [aut] (),\n Benjamin Kietzman [ctb],\n Posit Software, PBC [cph, fnd]", + "Maintainer": "Davis Vaughan ", + "Repository": "RSPM", + "Date/Publication": "2025-03-03 23:20:02 UTC", + "Built": "R 4.4.0; ; 2026-01-29 00:21:58 UTC; unix", + "RemotePkgRef": "cpp11@0.5.2", + "RemoteType": "standard", + "RemoteEtag": "\"ba97f5505a6c6275b01b4318e4ea1f97\"", + "RemotePackaged": "TRUE", + "RemoteRef": "cpp11", + "RemoteRepos": "https://packagemanager.posit.co/cran/latest", + "RemotePkgPlatform": "source", + "RemoteSha": "0.5.2" + } + }, + "crayon": { + "Source": "CRAN", + "Repository": "https://packagemanager.posit.co/cran/latest", + "description": { + "Package": "crayon", + "Title": "Colored Terminal Output", + "Version": "1.5.3", + "Authors@R": "c(\n person(\"Gábor\", \"Csárdi\", , \"csardi.gabor@gmail.com\", role = c(\"aut\", \"cre\")),\n person(\"Brodie\", \"Gaslam\", , \"brodie.gaslam@yahoo.com\", role = \"ctb\"),\n person(\"Posit Software, PBC\", role = c(\"cph\", \"fnd\"))\n )", + "Description": "The crayon package is now superseded. Please use the 'cli'\n package for new projects. Colored terminal output on terminals that\n support 'ANSI' color and highlight codes. It also works in 'Emacs'\n 'ESS'. 'ANSI' color support is automatically detected. Colors and\n highlighting can be combined and nested. New styles can also be\n created easily. This package was inspired by the 'chalk' 'JavaScript'\n project.", + "License": "MIT + file LICENSE", + "URL": "https://r-lib.github.io/crayon/, https://github.com/r-lib/crayon", + "BugReports": "https://github.com/r-lib/crayon/issues", + "Imports": "grDevices, methods, utils", + "Suggests": "mockery, rstudioapi, testthat, withr", + "Config/Needs/website": "tidyverse/tidytemplate", + "Encoding": "UTF-8", + "RoxygenNote": "7.3.1", + "Collate": "'aaa-rstudio-detect.R' 'aaaa-rematch2.R'\n'aab-num-ansi-colors.R' 'aac-num-ansi-colors.R' 'ansi-256.R'\n'ansi-palette.R' 'combine.R' 'string.R' 'utils.R'\n'crayon-package.R' 'disposable.R' 'enc-utils.R' 'has_ansi.R'\n'has_color.R' 'link.R' 'styles.R' 'machinery.R' 'parts.R'\n'print.R' 'style-var.R' 'show.R' 'string_operations.R'", + "NeedsCompilation": "no", + "Packaged": "2024-06-20 11:49:08 UTC; gaborcsardi", + "Author": "Gábor Csárdi [aut, cre],\n Brodie Gaslam [ctb],\n Posit Software, PBC [cph, fnd]", + "Maintainer": "Gábor Csárdi ", + "Repository": "RSPM", + "Date/Publication": "2024-06-20 13:00:02 UTC", + "Built": "R 4.4.0; ; 2026-01-29 00:21:08 UTC; unix", + "RemoteType": "standard", + "RemotePkgRef": "crayon", + "RemoteRef": "crayon", + "RemoteRepos": "https://packagemanager.posit.co/cran/latest", + "RemotePkgPlatform": "source", + "RemoteSha": "1.5.3" + } + }, + "crosstalk": { + "Source": "CRAN", + "Repository": "https://packagemanager.posit.co/cran/latest", + "description": { + "Package": "crosstalk", + "Type": "Package", + "Title": "Inter-Widget Interactivity for HTML Widgets", + "Version": "1.2.1", + "Authors@R": "c(\n person(\"Joe\", \"Cheng\", role = \"aut\", email = \"joe@posit.co\"),\n person(\"Carson\", \"Sievert\", role = c(\"aut\", \"cre\"),\n email = \"carson@posit.co\", comment = c(ORCID = \"0000-0002-4958-2844\")),\n person(\"Posit Software, PBC\", role = c(\"cph\", \"fnd\")),\n person(family = \"jQuery Foundation\", role = \"cph\",\n comment = \"jQuery library and jQuery UI library\"),\n person(family = \"jQuery contributors\", role = c(\"ctb\", \"cph\"),\n comment = \"jQuery library; authors listed in inst/www/shared/jquery-AUTHORS.txt\"),\n person(\"Mark\", \"Otto\", role = \"ctb\",\n comment = \"Bootstrap library\"),\n person(\"Jacob\", \"Thornton\", role = \"ctb\",\n comment = \"Bootstrap library\"),\n person(family = \"Bootstrap contributors\", role = \"ctb\",\n comment = \"Bootstrap library\"),\n person(family = \"Twitter, Inc\", role = \"cph\",\n comment = \"Bootstrap library\"),\n person(\"Brian\", \"Reavis\", role = c(\"ctb\", \"cph\"),\n comment = \"selectize.js library\"),\n person(\"Kristopher Michael\", \"Kowal\", role = c(\"ctb\", \"cph\"),\n comment = \"es5-shim library\"),\n person(family = \"es5-shim contributors\", role = c(\"ctb\", \"cph\"),\n comment = \"es5-shim library\"),\n person(\"Denis\", \"Ineshin\", role = c(\"ctb\", \"cph\"),\n comment = \"ion.rangeSlider library\"),\n person(\"Sami\", \"Samhuri\", role = c(\"ctb\", \"cph\"),\n comment = \"Javascript strftime library\")\n )", + "Description": "Provides building blocks for allowing HTML widgets to communicate\n with each other, with Shiny or without (i.e. static .html files). Currently\n supports linked brushing and filtering.", + "License": "MIT + file LICENSE", + "Imports": "htmltools (>= 0.3.6), jsonlite, lazyeval, R6", + "Suggests": "shiny, ggplot2, testthat (>= 2.1.0), sass, bslib", + "URL": "https://rstudio.github.io/crosstalk/,\nhttps://github.com/rstudio/crosstalk", + "BugReports": "https://github.com/rstudio/crosstalk/issues", + "RoxygenNote": "7.2.3", + "Encoding": "UTF-8", + "NeedsCompilation": "no", + "Packaged": "2023-11-22 16:29:50 UTC; cpsievert", + "Author": "Joe Cheng [aut],\n Carson Sievert [aut, cre] (),\n Posit Software, PBC [cph, fnd],\n jQuery Foundation [cph] (jQuery library and jQuery UI library),\n jQuery contributors [ctb, cph] (jQuery library; authors listed in\n inst/www/shared/jquery-AUTHORS.txt),\n Mark Otto [ctb] (Bootstrap library),\n Jacob Thornton [ctb] (Bootstrap library),\n Bootstrap contributors [ctb] (Bootstrap library),\n Twitter, Inc [cph] (Bootstrap library),\n Brian Reavis [ctb, cph] (selectize.js library),\n Kristopher Michael Kowal [ctb, cph] (es5-shim library),\n es5-shim contributors [ctb, cph] (es5-shim library),\n Denis Ineshin [ctb, cph] (ion.rangeSlider library),\n Sami Samhuri [ctb, cph] (Javascript strftime library)", + "Maintainer": "Carson Sievert ", + "Repository": "RSPM", + "Date/Publication": "2023-11-23 08:50:07 UTC", + "Built": "R 4.4.0; ; 2026-01-29 00:24:01 UTC; unix", + "RemotePkgRef": "crosstalk@1.2.1", + "RemoteType": "standard", + "RemoteEtag": "\"6deb0b0b3602a20b84d41fd4b5dd4614\"", + "RemotePackaged": "TRUE", + "RemoteRef": "crosstalk", + "RemoteRepos": "https://packagemanager.posit.co/cran/latest", + "RemotePkgPlatform": "source", + "RemoteSha": "1.2.1" + } + }, + "curl": { + "Source": "CRAN", + "Repository": "https://packagemanager.posit.co/cran/latest", + "description": { + "Package": "curl", + "Type": "Package", + "Title": "A Modern and Flexible Web Client for R", + "Version": "6.2.2", + "Authors@R": "c(\n person(\"Jeroen\", \"Ooms\", role = c(\"aut\", \"cre\"), email = \"jeroenooms@gmail.com\",\n comment = c(ORCID = \"0000-0002-4035-0289\")),\n person(\"Hadley\", \"Wickham\", role = \"ctb\"),\n person(\"Posit Software, PBC\", role = \"cph\"))", + "Description": "Bindings to 'libcurl' for performing fully\n configurable HTTP/FTP requests where responses can be processed in memory, on\n disk, or streaming via the callback or connection interfaces. Some knowledge\n of 'libcurl' is recommended; for a more-user-friendly web client see the \n 'httr2' package which builds on this package with http specific tools and logic.", + "License": "MIT + file LICENSE", + "SystemRequirements": "libcurl (>= 7.62): libcurl-devel (rpm) or\nlibcurl4-openssl-dev (deb)", + "URL": "https://jeroen.r-universe.dev/curl", + "BugReports": "https://github.com/jeroen/curl/issues", + "Suggests": "spelling, testthat (>= 1.0.0), knitr, jsonlite, later,\nrmarkdown, httpuv (>= 1.4.4), webutils", + "VignetteBuilder": "knitr", + "Depends": "R (>= 3.0.0)", + "RoxygenNote": "7.3.2.9000", + "Encoding": "UTF-8", + "Language": "en-US", + "NeedsCompilation": "yes", + "Packaged": "2025-03-23 13:24:53 UTC; jeroen", + "Author": "Jeroen Ooms [aut, cre] (),\n Hadley Wickham [ctb],\n Posit Software, PBC [cph]", + "Maintainer": "Jeroen Ooms ", + "Repository": "RSPM", + "Date/Publication": "2025-03-24 07:00:02 UTC", + "Built": "R 4.4.0; x86_64-pc-linux-gnu; 2026-01-29 00:22:06 UTC; unix", + "RemotePkgRef": "curl@6.2.2", + "RemoteType": "standard", + "RemoteEtag": "\"efca1b8911b41350aab9b22e3fba0643\"", + "RemotePackaged": "TRUE", + "RemoteRef": "curl", + "RemoteRepos": "https://packagemanager.posit.co/cran/latest", + "RemotePkgPlatform": "source", + "RemoteSha": "6.2.2" + } + }, + "data.table": { + "Source": "CRAN", + "Repository": "https://packagemanager.posit.co/cran/latest", + "description": { + "Package": "data.table", + "Version": "1.17.4", + "Title": "Extension of `data.frame`", + "Depends": "R (>= 3.3.0)", + "Imports": "methods", + "Suggests": "bit64 (>= 4.0.0), bit (>= 4.0.4), R.utils, xts, zoo (>=\n1.8-1), yaml, knitr, markdown", + "Description": "Fast aggregation of large data (e.g. 100GB in RAM), fast ordered joins, fast add/modify/delete of columns by group using no copies at all, list columns, friendly and fast character-separated-value read/write. Offers a natural and flexible syntax, for faster development.", + "License": "MPL-2.0 | file LICENSE", + "URL": "https://r-datatable.com, https://Rdatatable.gitlab.io/data.table,\nhttps://github.com/Rdatatable/data.table", + "BugReports": "https://github.com/Rdatatable/data.table/issues", + "VignetteBuilder": "knitr", + "Encoding": "UTF-8", + "ByteCompile": "TRUE", + "Authors@R": "c(\n person(\"Tyson\",\"Barrett\", role=c(\"aut\",\"cre\"), email=\"t.barrett88@gmail.com\", comment = c(ORCID=\"0000-0002-2137-1391\")),\n person(\"Matt\",\"Dowle\", role=\"aut\", email=\"mattjdowle@gmail.com\"),\n person(\"Arun\",\"Srinivasan\", role=\"aut\", email=\"asrini@pm.me\"),\n person(\"Jan\",\"Gorecki\", role=\"aut\"),\n person(\"Michael\",\"Chirico\", role=\"aut\", comment = c(ORCID=\"0000-0003-0787-087X\")),\n person(\"Toby\",\"Hocking\", role=\"aut\", comment = c(ORCID=\"0000-0002-3146-0865\")),\n person(\"Benjamin\",\"Schwendinger\",role=\"aut\", comment = c(ORCID=\"0000-0003-3315-8114\")),\n person(\"Ivan\", \"Krylov\", role=\"aut\", email=\"ikrylov@disroot.org\", comment = c(ORCID=\"0000-0002-0172-3812\")),\n person(\"Pasha\",\"Stetsenko\", role=\"ctb\"),\n person(\"Tom\",\"Short\", role=\"ctb\"),\n person(\"Steve\",\"Lianoglou\", role=\"ctb\"),\n person(\"Eduard\",\"Antonyan\", role=\"ctb\"),\n person(\"Markus\",\"Bonsch\", role=\"ctb\"),\n person(\"Hugh\",\"Parsonage\", role=\"ctb\"),\n person(\"Scott\",\"Ritchie\", role=\"ctb\"),\n person(\"Kun\",\"Ren\", role=\"ctb\"),\n person(\"Xianying\",\"Tan\", role=\"ctb\"),\n person(\"Rick\",\"Saporta\", role=\"ctb\"),\n person(\"Otto\",\"Seiskari\", role=\"ctb\"),\n person(\"Xianghui\",\"Dong\", role=\"ctb\"),\n person(\"Michel\",\"Lang\", role=\"ctb\"),\n person(\"Watal\",\"Iwasaki\", role=\"ctb\"),\n person(\"Seth\",\"Wenchel\", role=\"ctb\"),\n person(\"Karl\",\"Broman\", role=\"ctb\"),\n person(\"Tobias\",\"Schmidt\", role=\"ctb\"),\n person(\"David\",\"Arenburg\", role=\"ctb\"),\n person(\"Ethan\",\"Smith\", role=\"ctb\"),\n person(\"Francois\",\"Cocquemas\", role=\"ctb\"),\n person(\"Matthieu\",\"Gomez\", role=\"ctb\"),\n person(\"Philippe\",\"Chataignon\", role=\"ctb\"),\n person(\"Nello\",\"Blaser\", role=\"ctb\"),\n person(\"Dmitry\",\"Selivanov\", role=\"ctb\"),\n person(\"Andrey\",\"Riabushenko\", role=\"ctb\"),\n person(\"Cheng\",\"Lee\", role=\"ctb\"),\n person(\"Declan\",\"Groves\", role=\"ctb\"),\n person(\"Daniel\",\"Possenriede\", role=\"ctb\"),\n person(\"Felipe\",\"Parages\", role=\"ctb\"),\n person(\"Denes\",\"Toth\", role=\"ctb\"),\n person(\"Mus\",\"Yaramaz-David\", role=\"ctb\"),\n person(\"Ayappan\",\"Perumal\", role=\"ctb\"),\n person(\"James\",\"Sams\", role=\"ctb\"),\n person(\"Martin\",\"Morgan\", role=\"ctb\"),\n person(\"Michael\",\"Quinn\", role=\"ctb\"),\n person(\"@javrucebo\",\"\", role=\"ctb\"),\n person(\"@marc-outins\",\"\", role=\"ctb\"),\n person(\"Roy\",\"Storey\", role=\"ctb\"),\n person(\"Manish\",\"Saraswat\", role=\"ctb\"),\n person(\"Morgan\",\"Jacob\", role=\"ctb\"),\n person(\"Michael\",\"Schubmehl\", role=\"ctb\"),\n person(\"Davis\",\"Vaughan\", role=\"ctb\"),\n person(\"Leonardo\",\"Silvestri\", role=\"ctb\"),\n person(\"Jim\",\"Hester\", role=\"ctb\"),\n person(\"Anthony\",\"Damico\", role=\"ctb\"),\n person(\"Sebastian\",\"Freundt\", role=\"ctb\"),\n person(\"David\",\"Simons\", role=\"ctb\"),\n person(\"Elliott\",\"Sales de Andrade\", role=\"ctb\"),\n person(\"Cole\",\"Miller\", role=\"ctb\"),\n person(\"Jens Peder\",\"Meldgaard\", role=\"ctb\"),\n person(\"Vaclav\",\"Tlapak\", role=\"ctb\"),\n person(\"Kevin\",\"Ushey\", role=\"ctb\"),\n person(\"Dirk\",\"Eddelbuettel\", role=\"ctb\"),\n person(\"Tony\",\"Fischetti\", role=\"ctb\"),\n person(\"Ofek\",\"Shilon\", role=\"ctb\"),\n person(\"Vadim\",\"Khotilovich\", role=\"ctb\"),\n person(\"Hadley\",\"Wickham\", role=\"ctb\"),\n person(\"Bennet\",\"Becker\", role=\"ctb\"),\n person(\"Kyle\",\"Haynes\", role=\"ctb\"),\n person(\"Boniface Christian\",\"Kamgang\", role=\"ctb\"),\n person(\"Olivier\",\"Delmarcell\", role=\"ctb\"),\n person(\"Josh\",\"O'Brien\", role=\"ctb\"),\n person(\"Dereck\",\"de Mezquita\", role=\"ctb\"),\n person(\"Michael\",\"Czekanski\", role=\"ctb\"),\n person(\"Dmitry\", \"Shemetov\", role=\"ctb\"),\n person(\"Nitish\", \"Jha\", role=\"ctb\"),\n person(\"Joshua\", \"Wu\", role=\"ctb\"),\n person(\"Iago\", \"Giné-Vázquez\", role=\"ctb\"),\n person(\"Anirban\", \"Chetia\", role=\"ctb\"),\n person(\"Doris\", \"Amoakohene\", role=\"ctb\"),\n person(\"Angel\", \"Feliz\", role=\"ctb\"),\n person(\"Michael\",\"Young\", role=\"ctb\"),\n person(\"Mark\", \"Seeto\", role=\"ctb\"),\n person(\"Philippe\", \"Grosjean\", role=\"ctb\"),\n person(\"Vincent\", \"Runge\", role=\"ctb\"),\n person(\"Christian\", \"Wia\", role=\"ctb\"),\n person(\"Elise\", \"Maigné\", role=\"ctb\"),\n person(\"Vincent\", \"Rocher\", role=\"ctb\"),\n person(\"Vijay\", \"Lulla\", role=\"ctb\"),\n person(\"Aljaž\", \"Sluga\", role=\"ctb\"),\n person(\"Bill\", \"Evans\", role=\"ctb\")\n )", + "NeedsCompilation": "yes", + "Packaged": "2025-05-25 18:36:32 UTC; tysonbarrett", + "Author": "Tyson Barrett [aut, cre] (ORCID:\n ),\n Matt Dowle [aut],\n Arun Srinivasan [aut],\n Jan Gorecki [aut],\n Michael Chirico [aut] (ORCID: ),\n Toby Hocking [aut] (ORCID: ),\n Benjamin Schwendinger [aut] (ORCID:\n ),\n Ivan Krylov [aut] (ORCID: ),\n Pasha Stetsenko [ctb],\n Tom Short [ctb],\n Steve Lianoglou [ctb],\n Eduard Antonyan [ctb],\n Markus Bonsch [ctb],\n Hugh Parsonage [ctb],\n Scott Ritchie [ctb],\n Kun Ren [ctb],\n Xianying Tan [ctb],\n Rick Saporta [ctb],\n Otto Seiskari [ctb],\n Xianghui Dong [ctb],\n Michel Lang [ctb],\n Watal Iwasaki [ctb],\n Seth Wenchel [ctb],\n Karl Broman [ctb],\n Tobias Schmidt [ctb],\n David Arenburg [ctb],\n Ethan Smith [ctb],\n Francois Cocquemas [ctb],\n Matthieu Gomez [ctb],\n Philippe Chataignon [ctb],\n Nello Blaser [ctb],\n Dmitry Selivanov [ctb],\n Andrey Riabushenko [ctb],\n Cheng Lee [ctb],\n Declan Groves [ctb],\n Daniel Possenriede [ctb],\n Felipe Parages [ctb],\n Denes Toth [ctb],\n Mus Yaramaz-David [ctb],\n Ayappan Perumal [ctb],\n James Sams [ctb],\n Martin Morgan [ctb],\n Michael Quinn [ctb],\n @javrucebo [ctb],\n @marc-outins [ctb],\n Roy Storey [ctb],\n Manish Saraswat [ctb],\n Morgan Jacob [ctb],\n Michael Schubmehl [ctb],\n Davis Vaughan [ctb],\n Leonardo Silvestri [ctb],\n Jim Hester [ctb],\n Anthony Damico [ctb],\n Sebastian Freundt [ctb],\n David Simons [ctb],\n Elliott Sales de Andrade [ctb],\n Cole Miller [ctb],\n Jens Peder Meldgaard [ctb],\n Vaclav Tlapak [ctb],\n Kevin Ushey [ctb],\n Dirk Eddelbuettel [ctb],\n Tony Fischetti [ctb],\n Ofek Shilon [ctb],\n Vadim Khotilovich [ctb],\n Hadley Wickham [ctb],\n Bennet Becker [ctb],\n Kyle Haynes [ctb],\n Boniface Christian Kamgang [ctb],\n Olivier Delmarcell [ctb],\n Josh O'Brien [ctb],\n Dereck de Mezquita [ctb],\n Michael Czekanski [ctb],\n Dmitry Shemetov [ctb],\n Nitish Jha [ctb],\n Joshua Wu [ctb],\n Iago Giné-Vázquez [ctb],\n Anirban Chetia [ctb],\n Doris Amoakohene [ctb],\n Angel Feliz [ctb],\n Michael Young [ctb],\n Mark Seeto [ctb],\n Philippe Grosjean [ctb],\n Vincent Runge [ctb],\n Christian Wia [ctb],\n Elise Maigné [ctb],\n Vincent Rocher [ctb],\n Vijay Lulla [ctb],\n Aljaž Sluga [ctb],\n Bill Evans [ctb]", + "Maintainer": "Tyson Barrett ", + "Repository": "RSPM", + "Date/Publication": "2025-05-26 12:40:02 UTC", + "Built": "R 4.4.0; x86_64-pc-linux-gnu; 2026-01-29 00:22:33 UTC; unix", + "RemotePkgRef": "data.table@1.17.4", + "RemoteType": "standard", + "RemoteEtag": "\"2bc234b15f56d922e00a471340b384e9\"", + "RemotePackaged": "TRUE", + "RemoteRef": "data.table", + "RemoteRepos": "https://packagemanager.posit.co/cran/latest", + "RemotePkgPlatform": "source", + "RemoteSha": "1.17.4" + } + }, + "datawizard": { + "Source": "CRAN", + "Repository": "https://packagemanager.posit.co/cran/latest", + "description": { + "Type": "Package", + "Package": "datawizard", + "Title": "Easy Data Wrangling and Statistical Transformations", + "Version": "1.1.0", + "Authors@R": "c(\n person(\"Indrajeet\", \"Patil\", , \"patilindrajeet.science@gmail.com\", role = \"aut\",\n comment = c(ORCID = \"0000-0003-1995-6531\")),\n person(\"Etienne\", \"Bacher\", , \"etienne.bacher@protonmail.com\", role = c(\"aut\", \"cre\"),\n comment = c(ORCID = \"0000-0002-9271-5075\")),\n person(\"Dominique\", \"Makowski\", , \"dom.makowski@gmail.com\", role = \"aut\",\n comment = c(ORCID = \"0000-0001-5375-9967\")),\n person(\"Daniel\", \"Lüdecke\", , \"d.luedecke@uke.de\", role = \"aut\",\n comment = c(ORCID = \"0000-0002-8895-3206\")),\n person(\"Mattan S.\", \"Ben-Shachar\", , \"matanshm@post.bgu.ac.il\", role = \"aut\",\n comment = c(ORCID = \"0000-0002-4287-4801\")),\n person(\"Brenton M.\", \"Wiernik\", , \"brenton@wiernik.org\", role = \"aut\",\n comment = c(ORCID = \"0000-0001-9560-6336\")),\n person(\"Rémi\", \"Thériault\", , \"remi.theriault@mail.mcgill.ca\", role = \"ctb\",\n comment = c(ORCID = \"0000-0003-4315-6788\")),\n person(\"Thomas J.\", \"Faulkenberry\", , \"faulkenberry@tarleton.edu\", role = \"rev\"),\n person(\"Robert\", \"Garrett\", , \"rcg4@illinois.edu\", role = \"rev\")\n )", + "Maintainer": "Etienne Bacher ", + "Description": "A lightweight package to assist in key steps involved in any data\n analysis workflow: (1) wrangling the raw data to get it in the needed form,\n (2) applying preprocessing steps and statistical transformations, and\n (3) compute statistical summaries of data properties and distributions.\n It is also the data wrangling backend for packages in 'easystats' ecosystem.\n References: Patil et al. (2022) .", + "License": "MIT + file LICENSE", + "URL": "https://easystats.github.io/datawizard/", + "BugReports": "https://github.com/easystats/datawizard/issues", + "Depends": "R (>= 4.0)", + "Imports": "insight (>= 1.2.0), stats, utils", + "Suggests": "bayestestR, boot, BH, brms, curl, data.table, dplyr (>= 1.1),\neffectsize, emmeans, gamm4, ggplot2 (>= 3.5.0), gt, haven,\nhttr, knitr, lme4, mediation, modelbased, parameters (>=\n0.21.7), poorman (>= 0.2.7), psych, readxl, readr, rio,\nrmarkdown, rstanarm, see, testthat (>= 3.2.1), tibble, tidyr,\nwithr", + "VignetteBuilder": "knitr", + "Encoding": "UTF-8", + "Language": "en-US", + "RoxygenNote": "7.3.2", + "Config/testthat/edition": "3", + "Config/testthat/parallel": "true", + "Config/Needs/website": "easystats/easystatstemplate", + "NeedsCompilation": "no", + "Packaged": "2025-05-09 16:54:52 UTC; etienne", + "Author": "Indrajeet Patil [aut] (ORCID: ),\n Etienne Bacher [aut, cre] (ORCID:\n ),\n Dominique Makowski [aut] (ORCID:\n ),\n Daniel Lüdecke [aut] (ORCID: ),\n Mattan S. Ben-Shachar [aut] (ORCID:\n ),\n Brenton M. Wiernik [aut] (ORCID:\n ),\n Rémi Thériault [ctb] (ORCID: ),\n Thomas J. Faulkenberry [rev],\n Robert Garrett [rev]", + "Repository": "RSPM", + "Date/Publication": "2025-05-09 17:40:02 UTC", + "Built": "R 4.4.0; ; 2026-01-29 00:22:42 UTC; unix", + "RemotePkgRef": "datawizard@1.1.0", + "RemoteType": "standard", + "RemoteEtag": "\"3569131e8d53e36e5d35c3b17ce41182\"", + "RemotePackaged": "TRUE", + "RemoteRef": "datawizard", + "RemoteRepos": "https://packagemanager.posit.co/cran/latest", + "RemotePkgPlatform": "source", + "RemoteSha": "1.1.0" + } + }, + "desc": { + "Source": "CRAN", + "Repository": "https://packagemanager.posit.co/cran/latest", + "description": { + "Package": "desc", + "Title": "Manipulate DESCRIPTION Files", + "Version": "1.4.3", + "Authors@R": "c(\n person(\"Gábor\", \"Csárdi\", , \"csardi.gabor@gmail.com\", role = c(\"aut\", \"cre\")),\n person(\"Kirill\", \"Müller\", role = \"aut\"),\n person(\"Jim\", \"Hester\", , \"james.f.hester@gmail.com\", role = \"aut\"),\n person(\"Maëlle\", \"Salmon\", role = \"ctb\",\n comment = c(ORCID = \"0000-0002-2815-0399\")),\n person(\"Posit Software, PBC\", role = c(\"cph\", \"fnd\"))\n )", + "Maintainer": "Gábor Csárdi ", + "Description": "Tools to read, write, create, and manipulate DESCRIPTION\n files. It is intended for packages that create or manipulate other\n packages.", + "License": "MIT + file LICENSE", + "URL": "https://desc.r-lib.org/, https://github.com/r-lib/desc", + "BugReports": "https://github.com/r-lib/desc/issues", + "Depends": "R (>= 3.4)", + "Imports": "cli, R6, utils", + "Suggests": "callr, covr, gh, spelling, testthat, whoami, withr", + "Config/Needs/website": "tidyverse/tidytemplate", + "Config/testthat/edition": "3", + "Encoding": "UTF-8", + "Language": "en-US", + "RoxygenNote": "7.2.3", + "Collate": "'assertions.R' 'authors-at-r.R' 'built.R' 'classes.R'\n'collate.R' 'constants.R' 'deps.R' 'desc-package.R'\n'description.R' 'encoding.R' 'find-package-root.R' 'latex.R'\n'non-oo-api.R' 'package-archives.R' 'read.R' 'remotes.R'\n'str.R' 'syntax_checks.R' 'urls.R' 'utils.R' 'validate.R'\n'version.R'", + "NeedsCompilation": "no", + "Packaged": "2023-12-10 11:07:50 UTC; gaborcsardi", + "Author": "Gábor Csárdi [aut, cre],\n Kirill Müller [aut],\n Jim Hester [aut],\n Maëlle Salmon [ctb] (),\n Posit Software, PBC [cph, fnd]", + "Repository": "RSPM", + "Date/Publication": "2023-12-10 11:40:08 UTC", + "Built": "R 4.4.0; ; 2026-01-29 00:24:05 UTC; unix", + "RemotePkgRef": "desc@1.4.3", + "RemoteType": "standard", + "RemoteEtag": "\"1e051f049925406874bf5e73af34caa0\"", + "RemotePackaged": "TRUE", + "RemoteRef": "desc", + "RemoteRepos": "https://packagemanager.posit.co/cran/latest", + "RemotePkgPlatform": "source", + "RemoteSha": "1.4.3" + } + }, + "digest": { + "Source": "CRAN", + "Repository": "https://packagemanager.posit.co/cran/latest", + "description": { + "Package": "digest", + "Authors@R": "c(person(\"Dirk\", \"Eddelbuettel\", role = c(\"aut\", \"cre\"), email = \"edd@debian.org\",\n comment = c(ORCID = \"0000-0001-6419-907X\")),\n person(\"Antoine\", \"Lucas\", role=\"ctb\"),\n person(\"Jarek\", \"Tuszynski\", role=\"ctb\"),\n person(\"Henrik\", \"Bengtsson\", role=\"ctb\", comment = c(ORCID = \"0000-0002-7579-5165\")),\n person(\"Simon\", \"Urbanek\", role=\"ctb\", comment = c(ORCID = \"0000-0003-2297-1732\")),\n person(\"Mario\", \"Frasca\", role=\"ctb\"),\n person(\"Bryan\", \"Lewis\", role=\"ctb\"),\n person(\"Murray\", \"Stokely\", role=\"ctb\"),\n person(\"Hannes\", \"Muehleisen\", role=\"ctb\"),\n person(\"Duncan\", \"Murdoch\", role=\"ctb\"),\n person(\"Jim\", \"Hester\", role=\"ctb\"),\n person(\"Wush\", \"Wu\", role=\"ctb\", comment = c(ORCID = \"0000-0001-5180-0567\")),\n person(\"Qiang\", \"Kou\", role=\"ctb\", comment = c(ORCID = \"0000-0001-6786-5453\")),\n person(\"Thierry\", \"Onkelinx\", role=\"ctb\", comment = c(ORCID = \"0000-0001-8804-4216\")),\n person(\"Michel\", \"Lang\", role=\"ctb\", comment = c(ORCID = \"0000-0001-9754-0393\")),\n person(\"Viliam\", \"Simko\", role=\"ctb\"),\n person(\"Kurt\", \"Hornik\", role=\"ctb\", comment = c(ORCID = \"0000-0003-4198-9911\")),\n person(\"Radford\", \"Neal\", role=\"ctb\", comment = c(ORCID = \"0000-0002-2473-3407\")),\n person(\"Kendon\", \"Bell\", role=\"ctb\", comment = c(ORCID = \"0000-0002-9093-8312\")),\n person(\"Matthew\", \"de Queljoe\", role=\"ctb\"),\n person(\"Dmitry\", \"Selivanov\", role=\"ctb\"),\n person(\"Ion\", \"Suruceanu\", role=\"ctb\"),\n person(\"Bill\", \"Denney\", role=\"ctb\"),\n person(\"Dirk\", \"Schumacher\", role=\"ctb\"),\n person(\"András\", \"Svraka\", role=\"ctb\"),\n person(\"Sergey\", \"Fedorov\", role=\"ctb\"),\n person(\"Will\", \"Landau\", role=\"ctb\", comment = c(ORCID = \"0000-0003-1878-3253\")),\n person(\"Floris\", \"Vanderhaeghe\", role=\"ctb\", comment = c(ORCID = \"0000-0002-6378-6229\")),\n person(\"Kevin\", \"Tappe\", role=\"ctb\"),\n person(\"Harris\", \"McGehee\", role=\"ctb\"),\n person(\"Tim\", \"Mastny\", role=\"ctb\"),\n person(\"Aaron\", \"Peikert\", role=\"ctb\", comment = c(ORCID = \"0000-0001-7813-818X\")),\n person(\"Mark\", \"van der Loo\", role=\"ctb\", comment = c(ORCID = \"0000-0002-9807-4686\")),\n person(\"Chris\", \"Muir\", role=\"ctb\", comment = c(ORCID = \"0000-0003-2555-3878\")),\n person(\"Moritz\", \"Beller\", role=\"ctb\", comment = c(ORCID = \"0000-0003-4852-0526\")),\n person(\"Sebastian\", \"Campbell\", role=\"ctb\"),\n person(\"Winston\", \"Chang\", role=\"ctb\", comment = c(ORCID = \"0000-0002-1576-2126\")),\n person(\"Dean\", \"Attali\", role=\"ctb\", comment = c(ORCID = \"0000-0002-5645-3493\")),\n person(\"Michael\", \"Chirico\", role=\"ctb\", comment = c(ORCID = \"0000-0003-0787-087X\")),\n person(\"Kevin\", \"Ushey\", role=\"ctb\"))", + "Version": "0.6.37", + "Date": "2024-08-19", + "Title": "Create Compact Hash Digests of R Objects", + "Description": "Implementation of a function 'digest()' for the creation of hash\n digests of arbitrary R objects (using the 'md5', 'sha-1', 'sha-256', 'crc32',\n 'xxhash', 'murmurhash', 'spookyhash', 'blake3', 'crc32c', 'xxh3_64', and 'xxh3_128'\n algorithms) permitting easy comparison of R language objects, as well as functions\n such as'hmac()' to create hash-based message authentication code. Please note that\n this package is not meant to be deployed for cryptographic purposes for which more\n comprehensive (and widely tested) libraries such as 'OpenSSL' should be used.", + "URL": "https://github.com/eddelbuettel/digest,\nhttps://dirk.eddelbuettel.com/code/digest.html", + "BugReports": "https://github.com/eddelbuettel/digest/issues", + "Depends": "R (>= 3.3.0)", + "Imports": "utils", + "License": "GPL (>= 2)", + "Suggests": "tinytest, simplermarkdown", + "VignetteBuilder": "simplermarkdown", + "Encoding": "UTF-8", + "NeedsCompilation": "yes", + "Packaged": "2024-08-19 12:16:05 UTC; edd", + "Author": "Dirk Eddelbuettel [aut, cre] (),\n Antoine Lucas [ctb],\n Jarek Tuszynski [ctb],\n Henrik Bengtsson [ctb] (),\n Simon Urbanek [ctb] (),\n Mario Frasca [ctb],\n Bryan Lewis [ctb],\n Murray Stokely [ctb],\n Hannes Muehleisen [ctb],\n Duncan Murdoch [ctb],\n Jim Hester [ctb],\n Wush Wu [ctb] (),\n Qiang Kou [ctb] (),\n Thierry Onkelinx [ctb] (),\n Michel Lang [ctb] (),\n Viliam Simko [ctb],\n Kurt Hornik [ctb] (),\n Radford Neal [ctb] (),\n Kendon Bell [ctb] (),\n Matthew de Queljoe [ctb],\n Dmitry Selivanov [ctb],\n Ion Suruceanu [ctb],\n Bill Denney [ctb],\n Dirk Schumacher [ctb],\n András Svraka [ctb],\n Sergey Fedorov [ctb],\n Will Landau [ctb] (),\n Floris Vanderhaeghe [ctb] (),\n Kevin Tappe [ctb],\n Harris McGehee [ctb],\n Tim Mastny [ctb],\n Aaron Peikert [ctb] (),\n Mark van der Loo [ctb] (),\n Chris Muir [ctb] (),\n Moritz Beller [ctb] (),\n Sebastian Campbell [ctb],\n Winston Chang [ctb] (),\n Dean Attali [ctb] (),\n Michael Chirico [ctb] (),\n Kevin Ushey [ctb]", + "Maintainer": "Dirk Eddelbuettel ", + "Repository": "RSPM", + "Date/Publication": "2024-08-19 14:10:07 UTC", + "Built": "R 4.4.0; x86_64-pc-linux-gnu; 2026-01-29 00:22:00 UTC; unix", + "RemotePkgRef": "digest@0.6.37", + "RemoteType": "standard", + "RemoteEtag": "\"1f636399baad4aa58dd0fc4be934fa81\"", + "RemotePackaged": "TRUE", + "RemoteRef": "digest", + "RemoteRepos": "https://packagemanager.posit.co/cran/latest", + "RemotePkgPlatform": "source", + "RemoteSha": "0.6.37" + } + }, + "dplyr": { + "Source": "CRAN", + "Repository": "https://packagemanager.posit.co/cran/latest", + "description": { + "Type": "Package", + "Package": "dplyr", + "Title": "A Grammar of Data Manipulation", + "Version": "1.1.4", + "Authors@R": "c(\n person(\"Hadley\", \"Wickham\", , \"hadley@posit.co\", role = c(\"aut\", \"cre\"),\n comment = c(ORCID = \"0000-0003-4757-117X\")),\n person(\"Romain\", \"François\", role = \"aut\",\n comment = c(ORCID = \"0000-0002-2444-4226\")),\n person(\"Lionel\", \"Henry\", role = \"aut\"),\n person(\"Kirill\", \"Müller\", role = \"aut\",\n comment = c(ORCID = \"0000-0002-1416-3412\")),\n person(\"Davis\", \"Vaughan\", , \"davis@posit.co\", role = \"aut\",\n comment = c(ORCID = \"0000-0003-4777-038X\")),\n person(\"Posit Software, PBC\", role = c(\"cph\", \"fnd\"))\n )", + "Description": "A fast, consistent tool for working with data frame like\n objects, both in memory and out of memory.", + "License": "MIT + file LICENSE", + "URL": "https://dplyr.tidyverse.org, https://github.com/tidyverse/dplyr", + "BugReports": "https://github.com/tidyverse/dplyr/issues", + "Depends": "R (>= 3.5.0)", + "Imports": "cli (>= 3.4.0), generics, glue (>= 1.3.2), lifecycle (>=\n1.0.3), magrittr (>= 1.5), methods, pillar (>= 1.9.0), R6,\nrlang (>= 1.1.0), tibble (>= 3.2.0), tidyselect (>= 1.2.0),\nutils, vctrs (>= 0.6.4)", + "Suggests": "bench, broom, callr, covr, DBI, dbplyr (>= 2.2.1), ggplot2,\nknitr, Lahman, lobstr, microbenchmark, nycflights13, purrr,\nrmarkdown, RMySQL, RPostgreSQL, RSQLite, stringi (>= 1.7.6),\ntestthat (>= 3.1.5), tidyr (>= 1.3.0), withr", + "VignetteBuilder": "knitr", + "Config/Needs/website": "tidyverse, shiny, pkgdown, tidyverse/tidytemplate", + "Config/testthat/edition": "3", + "Encoding": "UTF-8", + "LazyData": "true", + "RoxygenNote": "7.2.3", + "NeedsCompilation": "yes", + "Packaged": "2023-11-16 21:48:56 UTC; hadleywickham", + "Author": "Hadley Wickham [aut, cre] (),\n Romain François [aut] (),\n Lionel Henry [aut],\n Kirill Müller [aut] (),\n Davis Vaughan [aut] (),\n Posit Software, PBC [cph, fnd]", + "Maintainer": "Hadley Wickham ", + "Repository": "RSPM", + "Date/Publication": "2023-11-17 16:50:02 UTC", + "Built": "R 4.4.0; x86_64-pc-linux-gnu; 2026-01-29 00:26:08 UTC; unix", + "RemotePkgRef": "dplyr@1.1.4", + "RemoteType": "standard", + "RemoteEtag": "\"d9de2cab2817b731a4fa207cf7faba2c\"", + "RemotePackaged": "TRUE", + "RemoteRef": "dplyr", + "RemoteRepos": "https://packagemanager.posit.co/cran/latest", + "RemotePkgPlatform": "source", + "RemoteSha": "1.1.4" + } + }, + "evaluate": { + "Source": "CRAN", + "Repository": "https://packagemanager.posit.co/cran/latest", + "description": { + "Type": "Package", + "Package": "evaluate", + "Title": "Parsing and Evaluation Tools that Provide More Details than the\nDefault", + "Version": "1.0.3", + "Authors@R": "c(\n person(\"Hadley\", \"Wickham\", , \"hadley@posit.co\", role = c(\"aut\", \"cre\")),\n person(\"Yihui\", \"Xie\", role = \"aut\",\n comment = c(ORCID = \"0000-0003-0645-5666\")),\n person(\"Michael\", \"Lawrence\", role = \"ctb\"),\n person(\"Thomas\", \"Kluyver\", role = \"ctb\"),\n person(\"Jeroen\", \"Ooms\", role = \"ctb\"),\n person(\"Barret\", \"Schloerke\", role = \"ctb\"),\n person(\"Adam\", \"Ryczkowski\", role = \"ctb\"),\n person(\"Hiroaki\", \"Yutani\", role = \"ctb\"),\n person(\"Michel\", \"Lang\", role = \"ctb\"),\n person(\"Karolis\", \"Koncevičius\", role = \"ctb\"),\n person(\"Posit Software, PBC\", role = c(\"cph\", \"fnd\"))\n )", + "Description": "Parsing and evaluation tools that make it easy to recreate\n the command line behaviour of R.", + "License": "MIT + file LICENSE", + "URL": "https://evaluate.r-lib.org/, https://github.com/r-lib/evaluate", + "BugReports": "https://github.com/r-lib/evaluate/issues", + "Depends": "R (>= 3.6.0)", + "Suggests": "callr, covr, ggplot2 (>= 3.3.6), lattice, methods, pkgload,\nrlang, knitr, testthat (>= 3.0.0), withr", + "Config/Needs/website": "tidyverse/tidytemplate", + "Config/testthat/edition": "3", + "Encoding": "UTF-8", + "RoxygenNote": "7.3.2", + "NeedsCompilation": "no", + "Packaged": "2025-01-10 22:27:28 UTC; hadleywickham", + "Author": "Hadley Wickham [aut, cre],\n Yihui Xie [aut] (),\n Michael Lawrence [ctb],\n Thomas Kluyver [ctb],\n Jeroen Ooms [ctb],\n Barret Schloerke [ctb],\n Adam Ryczkowski [ctb],\n Hiroaki Yutani [ctb],\n Michel Lang [ctb],\n Karolis Koncevičius [ctb],\n Posit Software, PBC [cph, fnd]", + "Maintainer": "Hadley Wickham ", + "Repository": "RSPM", + "Date/Publication": "2025-01-10 23:00:02 UTC", + "Built": "R 4.4.0; ; 2026-01-29 00:21:20 UTC; unix", + "RemotePkgRef": "evaluate@1.0.3", + "RemoteType": "standard", + "RemoteEtag": "\"fa9cba67dc7e4bf6315db36b4900ace8\"", + "RemotePackaged": "TRUE", + "RemoteRef": "evaluate", + "RemoteRepos": "https://packagemanager.posit.co/cran/latest", + "RemotePkgPlatform": "source", + "RemoteSha": "1.0.3" + } + }, + "fansi": { + "Source": "CRAN", + "Repository": "https://packagemanager.posit.co/cran/latest", + "description": { + "Package": "fansi", + "Title": "ANSI Control Sequence Aware String Functions", + "Description": "Counterparts to R string manipulation functions that account for\n the effects of ANSI text formatting control sequences.", + "Version": "1.0.6", + "Authors@R": "c(\n person(\"Brodie\", \"Gaslam\", email=\"brodie.gaslam@yahoo.com\",\n role=c(\"aut\", \"cre\")),\n person(\"Elliott\", \"Sales De Andrade\", role=\"ctb\"),\n person(family=\"R Core Team\",\n email=\"R-core@r-project.org\", role=\"cph\",\n comment=\"UTF8 byte length calcs from src/util.c\"\n ))", + "Depends": "R (>= 3.1.0)", + "License": "GPL-2 | GPL-3", + "URL": "https://github.com/brodieG/fansi", + "BugReports": "https://github.com/brodieG/fansi/issues", + "VignetteBuilder": "knitr", + "Suggests": "unitizer, knitr, rmarkdown", + "Imports": "grDevices, utils", + "RoxygenNote": "7.2.3", + "Encoding": "UTF-8", + "Collate": "'constants.R' 'fansi-package.R' 'internal.R' 'load.R' 'misc.R'\n'nchar.R' 'strwrap.R' 'strtrim.R' 'strsplit.R' 'substr2.R'\n'trimws.R' 'tohtml.R' 'unhandled.R' 'normalize.R' 'sgr.R'", + "NeedsCompilation": "yes", + "Packaged": "2023-12-06 00:59:41 UTC; bg", + "Author": "Brodie Gaslam [aut, cre],\n Elliott Sales De Andrade [ctb],\n R Core Team [cph] (UTF8 byte length calcs from src/util.c)", + "Maintainer": "Brodie Gaslam ", + "Repository": "RSPM", + "Date/Publication": "2023-12-08 03:30:02 UTC", + "Built": "R 4.4.0; x86_64-pc-linux-gnu; 2026-01-29 00:22:17 UTC; unix", + "RemotePkgRef": "fansi@1.0.6", + "RemoteType": "standard", + "RemoteEtag": "\"4a8aae729e5935072e078657693a77ec\"", + "RemotePackaged": "TRUE", + "RemoteRef": "fansi", + "RemoteRepos": "https://packagemanager.posit.co/cran/latest", + "RemotePkgPlatform": "source", + "RemoteSha": "1.0.6" + } + }, + "farver": { + "Source": "CRAN", + "Repository": "https://packagemanager.posit.co/cran/latest", + "description": { + "Type": "Package", + "Package": "farver", + "Title": "High Performance Colour Space Manipulation", + "Version": "2.1.2", + "Authors@R": "c(\n person(\"Thomas Lin\", \"Pedersen\", , \"thomas.pedersen@posit.co\", role = c(\"cre\", \"aut\"),\n comment = c(ORCID = \"0000-0002-5147-4711\")),\n person(\"Berendea\", \"Nicolae\", role = \"aut\",\n comment = \"Author of the ColorSpace C++ library\"),\n person(\"Romain\", \"François\", , \"romain@purrple.cat\", role = \"aut\",\n comment = c(ORCID = \"0000-0002-2444-4226\")),\n person(\"Posit, PBC\", role = c(\"cph\", \"fnd\"))\n )", + "Description": "The encoding of colour can be handled in many different ways,\n using different colour spaces. As different colour spaces have\n different uses, efficient conversion between these representations are\n important. The 'farver' package provides a set of functions that gives\n access to very fast colour space conversion and comparisons\n implemented in C++, and offers speed improvements over the\n 'convertColor' function in the 'grDevices' package.", + "License": "MIT + file LICENSE", + "URL": "https://farver.data-imaginist.com,\nhttps://github.com/thomasp85/farver", + "BugReports": "https://github.com/thomasp85/farver/issues", + "Suggests": "covr, testthat (>= 3.0.0)", + "Config/testthat/edition": "3", + "Encoding": "UTF-8", + "RoxygenNote": "7.3.1", + "NeedsCompilation": "yes", + "Packaged": "2024-05-13 08:31:27 UTC; thomas", + "Author": "Thomas Lin Pedersen [cre, aut]\n (),\n Berendea Nicolae [aut] (Author of the ColorSpace C++ library),\n Romain François [aut] (),\n Posit, PBC [cph, fnd]", + "Maintainer": "Thomas Lin Pedersen ", + "Repository": "RSPM", + "Date/Publication": "2024-05-13 09:33:09 UTC", + "Built": "R 4.4.0; x86_64-pc-linux-gnu; 2026-01-29 00:21:14 UTC; unix", + "RemoteType": "standard", + "RemotePkgRef": "farver", + "RemoteRef": "farver", + "RemoteRepos": "https://packagemanager.posit.co/cran/latest", + "RemotePkgPlatform": "source", + "RemoteSha": "2.1.2" + } + }, + "fastmap": { + "Source": "CRAN", + "Repository": "https://packagemanager.posit.co/cran/latest", + "description": { + "Package": "fastmap", + "Title": "Fast Data Structures", + "Version": "1.2.0", + "Authors@R": "c(\n person(\"Winston\", \"Chang\", email = \"winston@posit.co\", role = c(\"aut\", \"cre\")),\n person(given = \"Posit Software, PBC\", role = c(\"cph\", \"fnd\")),\n person(given = \"Tessil\", role = \"cph\", comment = \"hopscotch_map library\")\n )", + "Description": "Fast implementation of data structures, including a key-value\n store, stack, and queue. Environments are commonly used as key-value stores\n in R, but every time a new key is used, it is added to R's global symbol\n table, causing a small amount of memory leakage. This can be problematic in\n cases where many different keys are used. Fastmap avoids this memory leak\n issue by implementing the map using data structures in C++.", + "License": "MIT + file LICENSE", + "Encoding": "UTF-8", + "RoxygenNote": "7.2.3", + "Suggests": "testthat (>= 2.1.1)", + "URL": "https://r-lib.github.io/fastmap/, https://github.com/r-lib/fastmap", + "BugReports": "https://github.com/r-lib/fastmap/issues", + "NeedsCompilation": "yes", + "Packaged": "2024-05-14 17:54:13 UTC; winston", + "Author": "Winston Chang [aut, cre],\n Posit Software, PBC [cph, fnd],\n Tessil [cph] (hopscotch_map library)", + "Maintainer": "Winston Chang ", + "Repository": "RSPM", + "Date/Publication": "2024-05-15 09:00:07 UTC", + "Built": "R 4.4.0; x86_64-pc-linux-gnu; 2026-01-29 00:21:05 UTC; unix", + "RemoteType": "standard", + "RemotePkgRef": "fastmap", + "RemoteRef": "fastmap", + "RemoteRepos": "https://packagemanager.posit.co/cran/latest", + "RemotePkgPlatform": "source", + "RemoteSha": "1.2.0" + } + }, + "fontawesome": { + "Source": "CRAN", + "Repository": "https://packagemanager.posit.co/cran/latest", + "description": { + "Type": "Package", + "Package": "fontawesome", + "Version": "0.5.3", + "Title": "Easily Work with 'Font Awesome' Icons", + "Description": "Easily and flexibly insert 'Font Awesome' icons into 'R Markdown'\n documents and 'Shiny' apps. These icons can be inserted into HTML content\n through inline 'SVG' tags or 'i' tags. There is also a utility function for\n exporting 'Font Awesome' icons as 'PNG' images for those situations where\n raster graphics are needed.", + "Authors@R": "c(\n person(\"Richard\", \"Iannone\", , \"rich@posit.co\", c(\"aut\", \"cre\"),\n comment = c(ORCID = \"0000-0003-3925-190X\")),\n person(\"Christophe\", \"Dervieux\", , \"cderv@posit.co\", role = \"ctb\",\n comment = c(ORCID = \"0000-0003-4474-2498\")),\n person(\"Winston\", \"Chang\", , \"winston@posit.co\", role = \"ctb\"),\n person(\"Dave\", \"Gandy\", role = c(\"ctb\", \"cph\"),\n comment = \"Font-Awesome font\"),\n person(\"Posit Software, PBC\", role = c(\"cph\", \"fnd\"))\n )", + "License": "MIT + file LICENSE", + "URL": "https://github.com/rstudio/fontawesome,\nhttps://rstudio.github.io/fontawesome/", + "BugReports": "https://github.com/rstudio/fontawesome/issues", + "Encoding": "UTF-8", + "ByteCompile": "true", + "RoxygenNote": "7.3.2", + "Depends": "R (>= 3.3.0)", + "Imports": "rlang (>= 1.0.6), htmltools (>= 0.5.1.1)", + "Suggests": "covr, dplyr (>= 1.0.8), gt (>= 0.9.0), knitr (>= 1.31),\ntestthat (>= 3.0.0), rsvg", + "Config/testthat/edition": "3", + "NeedsCompilation": "no", + "Packaged": "2024-11-16 17:06:16 UTC; riannone", + "Author": "Richard Iannone [aut, cre] (),\n Christophe Dervieux [ctb] (),\n Winston Chang [ctb],\n Dave Gandy [ctb, cph] (Font-Awesome font),\n Posit Software, PBC [cph, fnd]", + "Maintainer": "Richard Iannone ", + "Repository": "RSPM", + "Date/Publication": "2024-11-16 17:30:02 UTC", + "Built": "R 4.4.0; ; 2026-01-29 00:23:55 UTC; unix", + "RemoteType": "standard", + "RemotePkgRef": "fontawesome", + "RemoteRef": "fontawesome", + "RemoteRepos": "https://packagemanager.posit.co/cran/latest", + "RemotePkgPlatform": "source", + "RemoteSha": "0.5.3" + } + }, + "forcats": { + "Source": "CRAN", + "Repository": "https://packagemanager.posit.co/cran/latest", + "description": { + "Package": "forcats", + "Title": "Tools for Working with Categorical Variables (Factors)", + "Version": "1.0.0", + "Authors@R": "c(\n person(\"Hadley\", \"Wickham\", , \"hadley@rstudio.com\", role = c(\"aut\", \"cre\")),\n person(\"RStudio\", role = c(\"cph\", \"fnd\"))\n )", + "Description": "Helpers for reordering factor levels (including moving\n specified levels to front, ordering by first appearance, reversing,\n and randomly shuffling), and tools for modifying factor levels\n (including collapsing rare levels into other, 'anonymising', and\n manually 'recoding').", + "License": "MIT + file LICENSE", + "URL": "https://forcats.tidyverse.org/,\nhttps://github.com/tidyverse/forcats", + "BugReports": "https://github.com/tidyverse/forcats/issues", + "Depends": "R (>= 3.4)", + "Imports": "cli (>= 3.4.0), glue, lifecycle, magrittr, rlang (>= 1.0.0),\ntibble", + "Suggests": "covr, dplyr, ggplot2, knitr, readr, rmarkdown, testthat (>=\n3.0.0), withr", + "VignetteBuilder": "knitr", + "Config/Needs/website": "tidyverse/tidytemplate", + "Config/testthat/edition": "3", + "Encoding": "UTF-8", + "LazyData": "true", + "RoxygenNote": "7.2.3", + "NeedsCompilation": "no", + "Packaged": "2023-01-27 14:11:11 UTC; hadleywickham", + "Author": "Hadley Wickham [aut, cre],\n RStudio [cph, fnd]", + "Maintainer": "Hadley Wickham ", + "Repository": "RSPM", + "Date/Publication": "2023-01-29 22:20:02 UTC", + "Built": "R 4.4.0; ; 2026-01-29 00:26:08 UTC; unix", + "RemotePkgRef": "forcats@1.0.0", + "RemoteType": "standard", + "RemoteEtag": "\"c1c2e0eaf54dbd3208b127b7aef9b9ce\"", + "RemotePackaged": "TRUE", + "RemoteRef": "forcats", + "RemoteRepos": "https://packagemanager.posit.co/cran/latest", + "RemotePkgPlatform": "source", + "RemoteSha": "1.0.0" + } + }, + "fs": { + "Source": "CRAN", + "Repository": "https://packagemanager.posit.co/cran/latest", + "description": { + "Package": "fs", + "Title": "Cross-Platform File System Operations Based on 'libuv'", + "Version": "1.6.5", + "Authors@R": "c(\n person(\"Jim\", \"Hester\", role = \"aut\"),\n person(\"Hadley\", \"Wickham\", , \"hadley@posit.co\", role = \"aut\"),\n person(\"Gábor\", \"Csárdi\", , \"csardi.gabor@gmail.com\", role = c(\"aut\", \"cre\")),\n person(\"libuv project contributors\", role = \"cph\",\n comment = \"libuv library\"),\n person(\"Joyent, Inc. and other Node contributors\", role = \"cph\",\n comment = \"libuv library\"),\n person(\"Posit Software, PBC\", role = c(\"cph\", \"fnd\"))\n )", + "Description": "A cross-platform interface to file system operations, built\n on top of the 'libuv' C library.", + "License": "MIT + file LICENSE", + "URL": "https://fs.r-lib.org, https://github.com/r-lib/fs", + "BugReports": "https://github.com/r-lib/fs/issues", + "Depends": "R (>= 3.6)", + "Imports": "methods", + "Suggests": "covr, crayon, knitr, pillar (>= 1.0.0), rmarkdown, spelling,\ntestthat (>= 3.0.0), tibble (>= 1.1.0), vctrs (>= 0.3.0), withr", + "VignetteBuilder": "knitr", + "ByteCompile": "true", + "Config/Needs/website": "tidyverse/tidytemplate", + "Config/testthat/edition": "3", + "Copyright": "file COPYRIGHTS", + "Encoding": "UTF-8", + "Language": "en-US", + "RoxygenNote": "7.2.3", + "SystemRequirements": "GNU make", + "NeedsCompilation": "yes", + "Packaged": "2024-10-28 22:30:40 UTC; gaborcsardi", + "Author": "Jim Hester [aut],\n Hadley Wickham [aut],\n Gábor Csárdi [aut, cre],\n libuv project contributors [cph] (libuv library),\n Joyent, Inc. and other Node contributors [cph] (libuv library),\n Posit Software, PBC [cph, fnd]", + "Maintainer": "Gábor Csárdi ", + "Repository": "RSPM", + "Date/Publication": "2024-10-30 08:40:02 UTC", + "Built": "R 4.4.0; x86_64-pc-linux-gnu; 2026-01-29 00:21:22 UTC; unix", + "RemotePkgRef": "fs@1.6.5", + "RemoteType": "standard", + "RemoteEtag": "\"cffb87ad896d6e13912e5b1f3686ea54\"", + "RemotePackaged": "TRUE", + "RemoteRef": "fs", + "RemoteRepos": "https://packagemanager.posit.co/cran/latest", + "RemotePkgPlatform": "source", + "RemoteSha": "1.6.5" + } + }, + "generics": { + "Source": "CRAN", + "Repository": "https://packagemanager.posit.co/cran/latest", + "description": { + "Package": "generics", + "Title": "Common S3 Generics not Provided by Base R Methods Related to\nModel Fitting", + "Version": "0.1.3", + "Authors@R": "c(\n person(\"Hadley\", \"Wickham\", , \"hadley@rstudio.com\", role = c(\"aut\", \"cre\")),\n person(\"Max\", \"Kuhn\", , \"max@rstudio.com\", role = \"aut\"),\n person(\"Davis\", \"Vaughan\", , \"davis@rstudio.com\", role = \"aut\"),\n person(\"RStudio\", role = \"cph\")\n )", + "Description": "In order to reduce potential package dependencies and\n conflicts, generics provides a number of commonly used S3 generics.", + "License": "MIT + file LICENSE", + "URL": "https://generics.r-lib.org, https://github.com/r-lib/generics", + "BugReports": "https://github.com/r-lib/generics/issues", + "Depends": "R (>= 3.2)", + "Imports": "methods", + "Suggests": "covr, pkgload, testthat (>= 3.0.0), tibble, withr", + "Config/Needs/website": "tidyverse/tidytemplate", + "Config/testthat/edition": "3", + "Encoding": "UTF-8", + "RoxygenNote": "7.2.0", + "NeedsCompilation": "no", + "Packaged": "2022-07-05 14:52:13 UTC; davis", + "Author": "Hadley Wickham [aut, cre],\n Max Kuhn [aut],\n Davis Vaughan [aut],\n RStudio [cph]", + "Maintainer": "Hadley Wickham ", + "Repository": "RSPM", + "Date/Publication": "2022-07-05 19:40:02 UTC", + "Built": "R 4.4.0; ; 2026-01-29 00:22:01 UTC; unix", + "RemotePkgRef": "generics@0.1.3", + "RemoteType": "standard", + "RemoteEtag": "\"51de14c8754af5997f9ebf4a8af931a5\"", + "RemotePackaged": "TRUE", + "RemoteRef": "generics", + "RemoteRepos": "https://packagemanager.posit.co/cran/latest", + "RemotePkgPlatform": "source", + "RemoteSha": "0.1.3" + } + }, + "ggcorrplot": { + "Source": "CRAN", + "Repository": "https://packagemanager.posit.co/cran/latest", + "description": { + "Type": "Package", + "Package": "ggcorrplot", + "Title": "Visualization of a Correlation Matrix using 'ggplot2'", + "Version": "0.1.4.1", + "Authors@R": "\n c(person(given = \"Alboukadel\",\n family = \"Kassambara\",\n role = c(\"aut\", \"cre\"),\n email = \"alboukadel.kassambara@gmail.com\"),\n person(given = \"Indrajeet\",\n family = \"Patil\",\n role = \"ctb\",\n email = \"patilindrajeet.science@gmail.com\",\n comment = c(ORCID = \"0000-0003-1995-6531\", Twitter = \"@patilindrajeets\")))", + "Description": "The 'ggcorrplot' package can be used to visualize easily a\n correlation matrix using 'ggplot2'. It provides a solution for\n reordering the correlation matrix and displays the significance level\n on the plot. It also includes a function for computing a matrix of\n correlation p-values.", + "License": "GPL-2", + "URL": "http://www.sthda.com/english/wiki/ggcorrplot-visualization-of-a-correlation-matrix-using-ggplot2", + "BugReports": "https://github.com/kassambara/ggcorrplot/issues", + "Depends": "R (>= 3.3), ggplot2 (>= 3.3.6)", + "Imports": "reshape2, stats", + "Suggests": "testthat (>= 3.0.0), knitr, spelling, vdiffr (>= 1.0.0)", + "Encoding": "UTF-8", + "Language": "en-US", + "RoxygenNote": "7.1.0", + "Config/testthat/edition": "3", + "NeedsCompilation": "no", + "Packaged": "2023-09-05 15:45:33 UTC; hornik", + "Author": "Alboukadel Kassambara [aut, cre],\n Indrajeet Patil [ctb] (,\n @patilindrajeets)", + "Maintainer": "Alboukadel Kassambara ", + "Repository": "RSPM", + "Date/Publication": "2023-09-05 15:50:48 UTC", + "Built": "R 4.4.0; ; 2026-01-29 00:33:25 UTC; unix", + "RemotePkgRef": "ggcorrplot@0.1.4.1", + "RemoteType": "standard", + "RemoteEtag": "\"445a27fdb35ef041f7852ede244ae18d\"", + "RemotePackaged": "TRUE", + "RemoteRef": "ggcorrplot", + "RemoteRepos": "https://packagemanager.posit.co/cran/latest", + "RemotePkgPlatform": "source", + "RemoteSha": "0.1.4.1" + } + }, + "ggplot2": { + "Source": "CRAN", + "Repository": "https://packagemanager.posit.co/cran/latest", + "description": { + "Package": "ggplot2", + "Version": "3.5.2", + "Title": "Create Elegant Data Visualisations Using the Grammar of Graphics", + "Authors@R": "c(\n person(\"Hadley\", \"Wickham\", , \"hadley@posit.co\", role = \"aut\",\n comment = c(ORCID = \"0000-0003-4757-117X\")),\n person(\"Winston\", \"Chang\", role = \"aut\",\n comment = c(ORCID = \"0000-0002-1576-2126\")),\n person(\"Lionel\", \"Henry\", role = \"aut\"),\n person(\"Thomas Lin\", \"Pedersen\", , \"thomas.pedersen@posit.co\", role = c(\"aut\", \"cre\"),\n comment = c(ORCID = \"0000-0002-5147-4711\")),\n person(\"Kohske\", \"Takahashi\", role = \"aut\"),\n person(\"Claus\", \"Wilke\", role = \"aut\",\n comment = c(ORCID = \"0000-0002-7470-9261\")),\n person(\"Kara\", \"Woo\", role = \"aut\",\n comment = c(ORCID = \"0000-0002-5125-4188\")),\n person(\"Hiroaki\", \"Yutani\", role = \"aut\",\n comment = c(ORCID = \"0000-0002-3385-7233\")),\n person(\"Dewey\", \"Dunnington\", role = \"aut\",\n comment = c(ORCID = \"0000-0002-9415-4582\")),\n person(\"Teun\", \"van den Brand\", role = \"aut\",\n comment = c(ORCID = \"0000-0002-9335-7468\")),\n person(\"Posit, PBC\", role = c(\"cph\", \"fnd\"))\n )", + "Description": "A system for 'declaratively' creating graphics, based on \"The\n Grammar of Graphics\". You provide the data, tell 'ggplot2' how to map\n variables to aesthetics, what graphical primitives to use, and it\n takes care of the details.", + "License": "MIT + file LICENSE", + "URL": "https://ggplot2.tidyverse.org,\nhttps://github.com/tidyverse/ggplot2", + "BugReports": "https://github.com/tidyverse/ggplot2/issues", + "Depends": "R (>= 3.5)", + "Imports": "cli, glue, grDevices, grid, gtable (>= 0.1.1), isoband,\nlifecycle (> 1.0.1), MASS, mgcv, rlang (>= 1.1.0), scales (>=\n1.3.0), stats, tibble, vctrs (>= 0.6.0), withr (>= 2.5.0)", + "Suggests": "covr, dplyr, ggplot2movies, hexbin, Hmisc, knitr, mapproj,\nmaps, multcomp, munsell, nlme, profvis, quantreg, ragg (>=\n1.2.6), RColorBrewer, rmarkdown, rpart, sf (>= 0.7-3), svglite\n(>= 2.1.2), testthat (>= 3.1.2), vdiffr (>= 1.0.6), xml2", + "Enhances": "sp", + "VignetteBuilder": "knitr", + "Config/Needs/website": "ggtext, tidyr, forcats, tidyverse/tidytemplate", + "Config/testthat/edition": "3", + "Encoding": "UTF-8", + "LazyData": "true", + "RoxygenNote": "7.3.2", + "Collate": "'ggproto.R' 'ggplot-global.R' 'aaa-.R'\n'aes-colour-fill-alpha.R' 'aes-evaluation.R'\n'aes-group-order.R' 'aes-linetype-size-shape.R'\n'aes-position.R' 'compat-plyr.R' 'utilities.R' 'aes.R'\n'utilities-checks.R' 'legend-draw.R' 'geom-.R'\n'annotation-custom.R' 'annotation-logticks.R' 'geom-polygon.R'\n'geom-map.R' 'annotation-map.R' 'geom-raster.R'\n'annotation-raster.R' 'annotation.R' 'autolayer.R' 'autoplot.R'\n'axis-secondary.R' 'backports.R' 'bench.R' 'bin.R' 'coord-.R'\n'coord-cartesian-.R' 'coord-fixed.R' 'coord-flip.R'\n'coord-map.R' 'coord-munch.R' 'coord-polar.R'\n'coord-quickmap.R' 'coord-radial.R' 'coord-sf.R'\n'coord-transform.R' 'data.R' 'docs_layer.R' 'facet-.R'\n'facet-grid-.R' 'facet-null.R' 'facet-wrap.R' 'fortify-lm.R'\n'fortify-map.R' 'fortify-multcomp.R' 'fortify-spatial.R'\n'fortify.R' 'stat-.R' 'geom-abline.R' 'geom-rect.R'\n'geom-bar.R' 'geom-bin2d.R' 'geom-blank.R' 'geom-boxplot.R'\n'geom-col.R' 'geom-path.R' 'geom-contour.R' 'geom-count.R'\n'geom-crossbar.R' 'geom-segment.R' 'geom-curve.R'\n'geom-defaults.R' 'geom-ribbon.R' 'geom-density.R'\n'geom-density2d.R' 'geom-dotplot.R' 'geom-errorbar.R'\n'geom-errorbarh.R' 'geom-freqpoly.R' 'geom-function.R'\n'geom-hex.R' 'geom-histogram.R' 'geom-hline.R' 'geom-jitter.R'\n'geom-label.R' 'geom-linerange.R' 'geom-point.R'\n'geom-pointrange.R' 'geom-quantile.R' 'geom-rug.R' 'geom-sf.R'\n'geom-smooth.R' 'geom-spoke.R' 'geom-text.R' 'geom-tile.R'\n'geom-violin.R' 'geom-vline.R' 'ggplot2-package.R'\n'grob-absolute.R' 'grob-dotstack.R' 'grob-null.R' 'grouping.R'\n'theme-elements.R' 'guide-.R' 'guide-axis.R'\n'guide-axis-logticks.R' 'guide-axis-stack.R'\n'guide-axis-theta.R' 'guide-legend.R' 'guide-bins.R'\n'guide-colorbar.R' 'guide-colorsteps.R' 'guide-custom.R'\n'layer.R' 'guide-none.R' 'guide-old.R' 'guides-.R'\n'guides-grid.R' 'hexbin.R' 'import-standalone-obj-type.R'\n'import-standalone-types-check.R' 'labeller.R' 'labels.R'\n'layer-sf.R' 'layout.R' 'limits.R' 'margins.R' 'performance.R'\n'plot-build.R' 'plot-construction.R' 'plot-last.R' 'plot.R'\n'position-.R' 'position-collide.R' 'position-dodge.R'\n'position-dodge2.R' 'position-identity.R' 'position-jitter.R'\n'position-jitterdodge.R' 'position-nudge.R' 'position-stack.R'\n'quick-plot.R' 'reshape-add-margins.R' 'save.R' 'scale-.R'\n'scale-alpha.R' 'scale-binned.R' 'scale-brewer.R'\n'scale-colour.R' 'scale-continuous.R' 'scale-date.R'\n'scale-discrete-.R' 'scale-expansion.R' 'scale-gradient.R'\n'scale-grey.R' 'scale-hue.R' 'scale-identity.R'\n'scale-linetype.R' 'scale-linewidth.R' 'scale-manual.R'\n'scale-shape.R' 'scale-size.R' 'scale-steps.R' 'scale-type.R'\n'scale-view.R' 'scale-viridis.R' 'scales-.R' 'stat-align.R'\n'stat-bin.R' 'stat-bin2d.R' 'stat-bindot.R' 'stat-binhex.R'\n'stat-boxplot.R' 'stat-contour.R' 'stat-count.R'\n'stat-density-2d.R' 'stat-density.R' 'stat-ecdf.R'\n'stat-ellipse.R' 'stat-function.R' 'stat-identity.R'\n'stat-qq-line.R' 'stat-qq.R' 'stat-quantilemethods.R'\n'stat-sf-coordinates.R' 'stat-sf.R' 'stat-smooth-methods.R'\n'stat-smooth.R' 'stat-sum.R' 'stat-summary-2d.R'\n'stat-summary-bin.R' 'stat-summary-hex.R' 'stat-summary.R'\n'stat-unique.R' 'stat-ydensity.R' 'summarise-plot.R'\n'summary.R' 'theme.R' 'theme-defaults.R' 'theme-current.R'\n'utilities-break.R' 'utilities-grid.R' 'utilities-help.R'\n'utilities-matrix.R' 'utilities-patterns.R'\n'utilities-resolution.R' 'utilities-tidy-eval.R' 'zxx.R'\n'zzz.R'", + "NeedsCompilation": "no", + "Packaged": "2025-04-08 10:58:01 UTC; thomas", + "Author": "Hadley Wickham [aut] (),\n Winston Chang [aut] (),\n Lionel Henry [aut],\n Thomas Lin Pedersen [aut, cre]\n (),\n Kohske Takahashi [aut],\n Claus Wilke [aut] (),\n Kara Woo [aut] (),\n Hiroaki Yutani [aut] (),\n Dewey Dunnington [aut] (),\n Teun van den Brand [aut] (),\n Posit, PBC [cph, fnd]", + "Maintainer": "Thomas Lin Pedersen ", + "Repository": "RSPM", + "Date/Publication": "2025-04-09 09:40:10 UTC", + "Built": "R 4.4.0; ; 2026-01-29 00:33:02 UTC; unix", + "RemotePkgRef": "ggplot2@3.5.2", + "RemoteType": "standard", + "RemoteEtag": "\"e4607496c32c47d0127305ebcfdc8b84\"", + "RemotePackaged": "TRUE", + "RemoteRef": "ggplot2", + "RemoteRepos": "https://packagemanager.posit.co/cran/latest", + "RemotePkgPlatform": "source", + "RemoteSha": "3.5.2" + } + }, + "ggstats": { + "Source": "CRAN", + "Repository": "https://packagemanager.posit.co/cran/latest", + "description": { + "Package": "ggstats", + "Type": "Package", + "Title": "Extension to 'ggplot2' for Plotting Stats", + "Version": "0.9.0", + "Authors@R": "c(\n person(\n \"Joseph\", \"Larmarange\", ,\n \"joseph@larmarange.net\",\n role = c(\"aut\", \"cre\"),\n comment = c(ORCID = \"0000-0001-7097-700X\")\n )\n )", + "Description": "Provides new statistics, new geometries and new positions for \n 'ggplot2' and a suite of functions to facilitate the creation of \n statistical plots.", + "License": "GPL (>= 3)", + "URL": "https://larmarange.github.io/ggstats/,\nhttps://github.com/larmarange/ggstats", + "BugReports": "https://github.com/larmarange/ggstats/issues", + "Depends": "R (>= 4.2)", + "Imports": "cli, dplyr, forcats, ggplot2 (>= 3.4.0), lifecycle, patchwork,\npurrr, rlang, scales, stats, stringr, utils, tidyr", + "Suggests": "betareg, broom, broom.helpers (>= 1.20.0), emmeans, glue,\ngtsummary, knitr, labelled (>= 2.11.0), reshape, rmarkdown,\nnnet, parameters, pscl, testthat (>= 3.0.0), spelling, survey,\nsurvival, vdiffr", + "Encoding": "UTF-8", + "RoxygenNote": "7.3.2", + "Config/testthat/edition": "3", + "Language": "en-US", + "VignetteBuilder": "knitr", + "NeedsCompilation": "no", + "Packaged": "2025-03-10 10:35:16 UTC; josep", + "Author": "Joseph Larmarange [aut, cre] ()", + "Maintainer": "Joseph Larmarange ", + "Repository": "RSPM", + "Date/Publication": "2025-03-10 11:20:02 UTC", + "Built": "R 4.4.0; ; 2026-01-29 00:33:36 UTC; unix", + "RemotePkgRef": "ggstats@0.9.0", + "RemoteType": "standard", + "RemoteEtag": "\"8930342c33ec7bea26562acd7b1bcddb\"", + "RemotePackaged": "TRUE", + "RemoteRef": "ggstats", + "RemoteRepos": "https://packagemanager.posit.co/cran/latest", + "RemotePkgPlatform": "source", + "RemoteSha": "0.9.0" + } + }, + "ggsurvfit": { + "Source": "CRAN", + "Repository": "https://packagemanager.posit.co/cran/latest", + "description": { + "Package": "ggsurvfit", + "Title": "Flexible Time-to-Event Figures", + "Version": "1.1.0", + "Authors@R": "c(\n person(\"Daniel D.\", \"Sjoberg\", , \"danield.sjoberg@gmail.com\", role = c(\"aut\", \"cre\", \"cph\"),\n comment = c(ORCID = \"0000-0003-0862-2018\")),\n person(\"Mark\", \"Baillie\", , \"bailliem@gmail.com\", role = \"aut\"),\n person(\"Charlotta\", \"Fruechtenicht\", , \"charlotta.fruechtenicht@roche.com\", role = \"aut\",\n comment = c(ORCID = \"0000-0002-6689-6423\")),\n person(\"Steven\", \"Haesendonckx\", , \"shaesen2@its.jnj.com\", role = \"aut\",\n comment = c(ORCID = \"0000-0001-8222-3686\")),\n person(\"Tim\", \"Treis\", , \"tim.treis@outlook.de\", role = \"aut\",\n comment = c(ORCID = \"0000-0002-9686-4799\"))\n )", + "Description": "Ease the creation of time-to-event (i.e. survival) endpoint\n figures. The modular functions create figures ready for publication.\n Each of the functions that add to or modify the figure are written as\n proper 'ggplot2' geoms or stat methods, allowing the functions from\n this package to be combined with any function or customization from\n 'ggplot2' and other 'ggplot2' extension packages.", + "License": "MIT + file LICENSE", + "URL": "https://github.com/pharmaverse/ggsurvfit,\nhttps://www.danieldsjoberg.com/ggsurvfit/", + "BugReports": "https://github.com/pharmaverse/ggsurvfit/issues", + "Depends": "R (>= 3.5)", + "Imports": "broom (>= 1.0.0), cli (>= 3.0.0), dplyr (>= 1.0.3), ggplot2\n(>= 3.5.0), glue (>= 1.6.0), gtable, patchwork (>= 1.1.0),\nrlang (>= 1.0.0), survival (>= 3.6-4), tidyr (>= 1.0.0)", + "Suggests": "covr, knitr, rmarkdown, scales (>= 1.1.0), spelling, testthat\n(>= 3.2.0), tidycmprsk (>= 1.0.0), vdiffr (>= 1.0.0), withr", + "VignetteBuilder": "knitr", + "Config/Needs/website": "cowplot, ggeasy, gghighlight", + "Config/testthat/edition": "3", + "Encoding": "UTF-8", + "Language": "en-US", + "LazyData": "true", + "RoxygenNote": "7.3.1", + "NeedsCompilation": "no", + "Packaged": "2024-05-08 20:28:46 UTC; sjobergd", + "Author": "Daniel D. Sjoberg [aut, cre, cph]\n (),\n Mark Baillie [aut],\n Charlotta Fruechtenicht [aut] (),\n Steven Haesendonckx [aut] (),\n Tim Treis [aut] ()", + "Maintainer": "Daniel D. Sjoberg ", + "Repository": "RSPM", + "Date/Publication": "2024-05-08 20:50:02 UTC", + "Built": "R 4.4.0; ; 2026-01-29 00:33:36 UTC; unix", + "RemotePkgRef": "ggsurvfit@1.1.0", + "RemoteType": "standard", + "RemoteEtag": "\"81fdb0b44e30bb450bb7c28c4dc92184\"", + "RemotePackaged": "TRUE", + "RemoteRef": "ggsurvfit", + "RemoteRepos": "https://packagemanager.posit.co/cran/latest", + "RemotePkgPlatform": "source", + "RemoteSha": "1.1.0" + } + }, + "glue": { + "Source": "CRAN", + "Repository": "https://packagemanager.posit.co/cran/latest", + "description": { + "Package": "glue", + "Title": "Interpreted String Literals", + "Version": "1.8.0", + "Authors@R": "c(\n person(\"Jim\", \"Hester\", role = \"aut\",\n comment = c(ORCID = \"0000-0002-2739-7082\")),\n person(\"Jennifer\", \"Bryan\", , \"jenny@posit.co\", role = c(\"aut\", \"cre\"),\n comment = c(ORCID = \"0000-0002-6983-2759\")),\n person(\"Posit Software, PBC\", role = c(\"cph\", \"fnd\"))\n )", + "Description": "An implementation of interpreted string literals, inspired by\n Python's Literal String Interpolation\n and Docstrings\n and Julia's Triple-Quoted\n String Literals\n .", + "License": "MIT + file LICENSE", + "URL": "https://glue.tidyverse.org/, https://github.com/tidyverse/glue", + "BugReports": "https://github.com/tidyverse/glue/issues", + "Depends": "R (>= 3.6)", + "Imports": "methods", + "Suggests": "crayon, DBI (>= 1.2.0), dplyr, knitr, magrittr, rlang,\nrmarkdown, RSQLite, testthat (>= 3.2.0), vctrs (>= 0.3.0),\nwaldo (>= 0.5.3), withr", + "VignetteBuilder": "knitr", + "ByteCompile": "true", + "Config/Needs/website": "bench, forcats, ggbeeswarm, ggplot2, R.utils,\nrprintf, tidyr, tidyverse/tidytemplate", + "Config/testthat/edition": "3", + "Encoding": "UTF-8", + "RoxygenNote": "7.3.2", + "NeedsCompilation": "yes", + "Packaged": "2024-09-27 16:00:45 UTC; jenny", + "Author": "Jim Hester [aut] (),\n Jennifer Bryan [aut, cre] (),\n Posit Software, PBC [cph, fnd]", + "Maintainer": "Jennifer Bryan ", + "Repository": "RSPM", + "Date/Publication": "2024-09-30 22:30:01 UTC", + "Built": "R 4.4.0; x86_64-pc-linux-gnu; 2026-01-29 00:21:09 UTC; unix", + "RemoteType": "standard", + "RemotePkgRef": "glue", + "RemoteRef": "glue", + "RemoteRepos": "https://packagemanager.posit.co/cran/latest", + "RemotePkgPlatform": "source", + "RemoteSha": "1.8.0" + } + }, + "golem": { + "Source": "CRAN", + "Repository": "https://packagemanager.posit.co/cran/latest", + "description": { + "Package": "golem", + "Title": "A Framework for Robust Shiny Applications", + "Version": "0.5.1", + "Authors@R": "c(\n person(\"Colin\", \"Fay\", , \"contact@colinfay.me\", role = c(\"cre\", \"aut\"),\n comment = c(ORCID = \"0000-0001-7343-1846\")),\n person(\"Vincent\", \"Guyader\", , \"vincent@thinkr.fr\", role = \"aut\",\n comment = c(ORCID = \"0000-0003-0671-9270\", \"previous maintainer\")),\n person(\"Sébastien\", \"Rochette\", , \"sebastien@thinkr.fr\", role = \"aut\",\n comment = c(ORCID = \"0000-0002-1565-9313\")),\n person(\"Cervan\", \"Girard\", , \"cervan@thinkr.fr\", role = \"aut\",\n comment = c(ORCID = \"0000-0002-4816-4624\")),\n person(\"Novica\", \"Nakov\", , \"nnovica@gmail.com\", role = \"ctb\"),\n person(\"David\", \"Granjon\", , \"dgranjon@ymail.com\", role = \"ctb\"),\n person(\"Arthur\", \"Bréant\", , \"arthur@thinkr.fr\", role = \"ctb\"),\n person(\"Antoine\", \"Languillaume\", , \"antoine@thinkr.fr\", role = \"ctb\"),\n person(\"Ilya\", \"Zarubin\", , \"zarubin@wiso.uni-koeln.de\", role = \"ctb\"),\n person(\"ThinkR\", role = \"cph\")\n )", + "Description": "An opinionated framework for building a production-ready\n 'Shiny' application. This package contains a series of tools for\n building a robust 'Shiny' application from start to finish.", + "License": "MIT + file LICENSE", + "URL": "https://thinkr-open.github.io/golem/,\nhttps://github.com/ThinkR-open/golem", + "BugReports": "https://github.com/ThinkR-open/golem/issues", + "Depends": "R (>= 3.5.0)", + "Imports": "attempt (>= 0.3.0), config, here, htmltools, rlang (>= 1.0.0),\nshiny (>= 1.5.0), utils, yaml", + "Suggests": "attachment (>= 0.3.2), callr, cli (>= 2.0.0), covr, crayon,\ndesc, devtools, dockerfiler (>= 0.2.0), fs, httpuv, knitr,\nmockery, pkgbuild, pkgdown, pkgload (>= 1.3.0), processx,\npurrr, rcmdcheck, remotes, renv, rmarkdown, roxygen2,\nrsconnect, rstudioapi, sass, spelling, stringr, testthat (>=\n3.0.0), tools, usethis (>= 1.6.0), withr", + "VignetteBuilder": "knitr", + "Config/testthat/edition": "3", + "Config/testthat/parallel": "true", + "Encoding": "UTF-8", + "Language": "en-US", + "RoxygenNote": "7.3.2", + "NeedsCompilation": "no", + "Packaged": "2024-08-27 10:11:51 UTC; colinfay", + "Author": "Colin Fay [cre, aut] (),\n Vincent Guyader [aut] (,\n previous maintainer),\n Sébastien Rochette [aut] (),\n Cervan Girard [aut] (),\n Novica Nakov [ctb],\n David Granjon [ctb],\n Arthur Bréant [ctb],\n Antoine Languillaume [ctb],\n Ilya Zarubin [ctb],\n ThinkR [cph]", + "Maintainer": "Colin Fay ", + "Repository": "RSPM", + "Date/Publication": "2024-08-27 10:50:32 UTC", + "Built": "R 4.4.0; ; 2026-01-29 00:30:26 UTC; unix", + "RemotePkgRef": "golem@0.5.1", + "RemoteType": "standard", + "RemoteEtag": "\"878d131eb815977cae577ea3f99a7256\"", + "RemotePackaged": "TRUE", + "RemoteRef": "golem", + "RemoteRepos": "https://packagemanager.posit.co/cran/latest", + "RemotePkgPlatform": "source", + "RemoteSha": "0.5.1" + } + }, + "gt": { + "Source": "CRAN", + "Repository": "https://packagemanager.posit.co/cran/latest", + "description": { + "Type": "Package", + "Package": "gt", + "Title": "Easily Create Presentation-Ready Display Tables", + "Version": "1.0.0", + "Authors@R": "c(\n person(\"Richard\", \"Iannone\", , \"rich@posit.co\", role = c(\"aut\", \"cre\"),\n comment = c(ORCID = \"0000-0003-3925-190X\")),\n person(\"Joe\", \"Cheng\", , \"joe@posit.co\", role = \"aut\"),\n person(\"Barret\", \"Schloerke\", , \"barret@posit.co\", role = \"aut\",\n comment = c(ORCID = \"0000-0001-9986-114X\")),\n person(\"Ellis\", \"Hughes\", , \"ellis.h.hughes@gsk.com\", role = \"aut\",\n comment = c(ORCID = \"0000-0003-0637-4436\")),\n person(\"Alexandra\", \"Lauer\", , \"alexandralauer1@gmail.com\", role = \"aut\",\n comment = c(ORCID = \"0000-0002-4191-6301\")),\n person(\"JooYoung\", \"Seo\", , \"jseo1005@illinois.edu\", role = \"aut\",\n comment = c(ORCID = \"0000-0002-4064-6012\")),\n person(\"Ken\", \"Brevoort\", , \"ken@brevoort.com\", role = \"aut\",\n comment = c(ORCID = \"0000-0002-4001-8358\")),\n person(\"Olivier\", \"Roy\", role = \"aut\"),\n person(\"Posit Software, PBC\", role = c(\"cph\", \"fnd\"))\n )", + "Description": "Build display tables from tabular data with an easy-to-use\n set of functions. With its progressive approach, we can construct\n display tables with a cohesive set of table parts. Table values can be\n formatted using any of the included formatting functions. Footnotes\n and cell styles can be precisely added through a location targeting\n system. The way in which 'gt' handles things for you means that you\n don't often have to worry about the fine details.", + "License": "MIT + file LICENSE", + "URL": "https://gt.rstudio.com, https://github.com/rstudio/gt", + "BugReports": "https://github.com/rstudio/gt/issues", + "Depends": "R (>= 3.6.0)", + "Imports": "base64enc (>= 0.1-3), bigD (>= 0.2), bitops (>= 1.0-7), cli\n(>= 3.6.3), commonmark (>= 1.9.1), dplyr (>= 1.1.4), fs (>=\n1.6.4), glue (>= 1.8.0), htmltools (>= 0.5.8.1), htmlwidgets\n(>= 1.6.4), juicyjuice (>= 0.1.0), magrittr (>= 2.0.3),\nmarkdown (>= 1.13), reactable (>= 0.4.4), rlang (>= 1.1.4),\nsass (>= 0.4.9), scales (>= 1.3.0), tidyselect (>= 1.2.1),\nvctrs, xml2 (>= 1.3.6)", + "Suggests": "fontawesome (>= 0.5.2), ggplot2, grid, gtable (>= 0.3.6),\nkatex (>= 1.4.1), knitr, lubridate, magick, paletteer,\nRColorBrewer, rmarkdown (>= 2.20), rsvg, rvest, shiny (>=\n1.9.1), testthat (>= 3.1.9), tidyr (>= 1.0.0), webshot2 (>=\n0.1.0), withr", + "Config/Needs/coverage": "officer", + "Config/Needs/website": "quarto", + "ByteCompile": "true", + "Config/testthat/edition": "3", + "Config/testthat/parallel": "true", + "Encoding": "UTF-8", + "LazyData": "true", + "RoxygenNote": "7.3.2", + "NeedsCompilation": "no", + "Packaged": "2025-04-04 17:08:33 UTC; riannone", + "Author": "Richard Iannone [aut, cre] (),\n Joe Cheng [aut],\n Barret Schloerke [aut] (),\n Ellis Hughes [aut] (),\n Alexandra Lauer [aut] (),\n JooYoung Seo [aut] (),\n Ken Brevoort [aut] (),\n Olivier Roy [aut],\n Posit Software, PBC [cph, fnd]", + "Maintainer": "Richard Iannone ", + "Repository": "RSPM", + "Date/Publication": "2025-04-05 15:00:02 UTC", + "Built": "R 4.4.0; ; 2026-01-29 00:30:07 UTC; unix", + "RemotePkgRef": "gt@1.0.0", + "RemoteType": "standard", + "RemoteEtag": "\"e78a22bfa35cfb6136e4e8aa8673ef8b\"", + "RemotePackaged": "TRUE", + "RemoteRef": "gt", + "RemoteRepos": "https://packagemanager.posit.co/cran/latest", + "RemotePkgPlatform": "source", + "RemoteSha": "1.0.0" + } + }, + "gtable": { + "Source": "CRAN", + "Repository": "https://packagemanager.posit.co/cran/latest", + "description": { + "Package": "gtable", + "Title": "Arrange 'Grobs' in Tables", + "Version": "0.3.6", + "Authors@R": "c(\n person(\"Hadley\", \"Wickham\", , \"hadley@posit.co\", role = \"aut\"),\n person(\"Thomas Lin\", \"Pedersen\", , \"thomas.pedersen@posit.co\", role = c(\"aut\", \"cre\")),\n person(\"Posit Software, PBC\", role = c(\"cph\", \"fnd\"))\n )", + "Description": "Tools to make it easier to work with \"tables\" of 'grobs'. The\n 'gtable' package defines a 'gtable' grob class that specifies a grid\n along with a list of grobs and their placement in the grid. Further\n the package makes it easy to manipulate and combine 'gtable' objects\n so that complex compositions can be built up sequentially.", + "License": "MIT + file LICENSE", + "URL": "https://gtable.r-lib.org, https://github.com/r-lib/gtable", + "BugReports": "https://github.com/r-lib/gtable/issues", + "Depends": "R (>= 4.0)", + "Imports": "cli, glue, grid, lifecycle, rlang (>= 1.1.0), stats", + "Suggests": "covr, ggplot2, knitr, profvis, rmarkdown, testthat (>= 3.0.0)", + "VignetteBuilder": "knitr", + "Config/Needs/website": "tidyverse/tidytemplate", + "Config/testthat/edition": "3", + "Config/usethis/last-upkeep": "2024-10-25", + "Encoding": "UTF-8", + "RoxygenNote": "7.3.2", + "NeedsCompilation": "no", + "Packaged": "2024-10-25 12:42:05 UTC; thomas", + "Author": "Hadley Wickham [aut],\n Thomas Lin Pedersen [aut, cre],\n Posit Software, PBC [cph, fnd]", + "Maintainer": "Thomas Lin Pedersen ", + "Repository": "RSPM", + "Date/Publication": "2024-10-25 13:20:02 UTC", + "Built": "R 4.4.0; ; 2026-01-29 00:24:18 UTC; unix", + "RemoteType": "standard", + "RemotePkgRef": "gtable", + "RemoteRef": "gtable", + "RemoteRepos": "https://packagemanager.posit.co/cran/latest", + "RemotePkgPlatform": "source", + "RemoteSha": "0.3.6" + } + }, + "gtsummary": { + "Source": "CRAN", + "Repository": "https://packagemanager.posit.co/cran/latest", + "description": { + "Package": "gtsummary", + "Title": "Presentation-Ready Data Summary and Analytic Result Tables", + "Version": "2.4.0", + "Authors@R": "c(\n person(\"Daniel D.\", \"Sjoberg\", , \"danield.sjoberg@gmail.com\", role = c(\"aut\", \"cre\"),\n comment = c(ORCID = \"0000-0003-0862-2018\")),\n person(\"Joseph\", \"Larmarange\", role = \"aut\",\n comment = c(ORCID = \"0000-0001-7097-700X\")),\n person(\"Michael\", \"Curry\", role = \"aut\",\n comment = c(ORCID = \"0000-0002-0261-4044\")),\n person(\"Emily\", \"de la Rua\", , role = \"aut\",\n comment = c(ORCID = \"0009-0000-8738-5561\")),\n person(\"Jessica\", \"Lavery\", role = \"aut\",\n comment = c(ORCID = \"0000-0002-2746-5647\")),\n person(\"Karissa\", \"Whiting\", role = \"aut\",\n comment = c(ORCID = \"0000-0002-4683-1868\")),\n person(\"Emily C.\", \"Zabor\", role = \"aut\",\n comment = c(ORCID = \"0000-0002-1402-4498\")),\n person(\"Xing\", \"Bai\", role = \"ctb\"),\n person(\"Malcolm\", \"Barrett\", role = \"ctb\",\n comment = c(ORCID = \"0000-0003-0299-5825\")),\n person(\"Esther\", \"Drill\", role = \"ctb\",\n comment = c(ORCID = \"0000-0002-3315-4538\")),\n person(\"Jessica\", \"Flynn\", role = \"ctb\",\n comment = c(ORCID = \"0000-0001-8310-6684\")),\n person(\"Margie\", \"Hannum\", role = \"ctb\",\n comment = c(ORCID = \"0000-0002-2953-0449\")),\n person(\"Stephanie\", \"Lobaugh\", role = \"ctb\"),\n person(\"Shannon\", \"Pileggi\", role = \"ctb\",\n comment = c(ORCID = \"0000-0002-7732-4164\")),\n person(\"Amy\", \"Tin\", role = \"ctb\",\n comment = c(ORCID = \"0000-0002-8005-0694\")),\n person(\"Gustavo\", \"Zapata Wainberg\", role = \"ctb\",\n comment = c(ORCID = \"0000-0002-2524-3637\"))\n )", + "Description": "Creates presentation-ready tables summarizing data sets,\n regression models, and more. The code to create the tables is concise\n and highly customizable. Data frames can be summarized with any\n function, e.g. mean(), median(), even user-written functions.\n Regression models are summarized and include the reference rows for\n categorical variables. Common regression models, such as logistic\n regression and Cox proportional hazards regression, are automatically\n identified and the tables are pre-filled with appropriate column\n headers.", + "License": "MIT + file LICENSE", + "URL": "https://github.com/ddsjoberg/gtsummary,\nhttps://www.danieldsjoberg.com/gtsummary/", + "BugReports": "https://github.com/ddsjoberg/gtsummary/issues", + "Depends": "R (>= 4.2)", + "Imports": "cards (>= 0.7.0), cardx (>= 0.3.0), cli (>= 3.6.3), dplyr (>=\n1.1.3), glue (>= 1.8.0), gt (>= 0.11.1), lifecycle (>= 1.0.3),\nrlang (>= 1.1.1), tidyr (>= 1.3.0), vctrs (>= 0.6.4)", + "Suggests": "aod (>= 1.3.3), broom (>= 1.0.5), broom.helpers (>= 1.20.0),\nbroom.mixed (>= 0.2.9), car (>= 3.0-11), cmprsk, effectsize (>=\n0.6.0), emmeans (>= 1.7.3), flextable (>= 0.8.1), geepack (>=\n1.3.10), ggstats (>= 0.2.1), huxtable (>= 5.4.0), insight (>=\n0.15.0), kableExtra (>= 1.3.4), knitr (>= 1.37), lme4 (>=\n1.1-31), mice (>= 3.10.0), nnet, officer, openxlsx, parameters\n(>= 0.20.2), parsnip (>= 0.1.7), rmarkdown, smd (>= 0.6.6),\nspelling, survey (>= 4.2), survival (>= 3.6-4), testthat (>=\n3.2.0), withr (>= 2.5.0), workflows (>= 0.2.4)", + "VignetteBuilder": "knitr", + "Config/Needs/check": "hms", + "Config/Needs/website": "forcats, sandwich, scales", + "Config/testthat/edition": "3", + "Config/testthat/parallel": "true", + "Encoding": "UTF-8", + "Language": "en-US", + "LazyData": "true", + "RoxygenNote": "7.3.2", + "NeedsCompilation": "no", + "Packaged": "2025-08-28 03:45:15 UTC; sjobergd", + "Author": "Daniel D. Sjoberg [aut, cre] (ORCID:\n ),\n Joseph Larmarange [aut] (ORCID:\n ),\n Michael Curry [aut] (ORCID: ),\n Emily de la Rua [aut] (ORCID: ),\n Jessica Lavery [aut] (ORCID: ),\n Karissa Whiting [aut] (ORCID: ),\n Emily C. Zabor [aut] (ORCID: ),\n Xing Bai [ctb],\n Malcolm Barrett [ctb] (ORCID: ),\n Esther Drill [ctb] (ORCID: ),\n Jessica Flynn [ctb] (ORCID: ),\n Margie Hannum [ctb] (ORCID: ),\n Stephanie Lobaugh [ctb],\n Shannon Pileggi [ctb] (ORCID: ),\n Amy Tin [ctb] (ORCID: ),\n Gustavo Zapata Wainberg [ctb] (ORCID:\n )", + "Maintainer": "Daniel D. Sjoberg ", + "Repository": "RSPM", + "Date/Publication": "2025-08-28 04:50:02 UTC", + "Built": "R 4.4.0; ; 2026-01-29 00:30:50 UTC; unix", + "RemotePkgRef": "gtsummary@2.4.0", + "RemoteType": "standard", + "RemoteEtag": "\"834efad3e524de88c13ce8da569dcf88\"", + "RemotePackaged": "TRUE", + "RemoteRef": "gtsummary", + "RemoteRepos": "https://packagemanager.posit.co/cran/latest", + "RemotePkgPlatform": "source", + "RemoteSha": "2.4.0" + } + }, + "haven": { + "Source": "CRAN", + "Repository": "https://packagemanager.posit.co/cran/latest", + "description": { + "Package": "haven", + "Title": "Import and Export 'SPSS', 'Stata' and 'SAS' Files", + "Version": "2.5.4", + "Authors@R": "c(\n person(\"Hadley\", \"Wickham\", , \"hadley@posit.co\", role = c(\"aut\", \"cre\")),\n person(\"Evan\", \"Miller\", role = c(\"aut\", \"cph\"),\n comment = \"Author of included ReadStat code\"),\n person(\"Danny\", \"Smith\", role = \"aut\"),\n person(\"Posit Software, PBC\", role = c(\"cph\", \"fnd\"))\n )", + "Description": "Import foreign statistical formats into R via the embedded\n 'ReadStat' C library, .", + "License": "MIT + file LICENSE", + "URL": "https://haven.tidyverse.org, https://github.com/tidyverse/haven,\nhttps://github.com/WizardMac/ReadStat", + "BugReports": "https://github.com/tidyverse/haven/issues", + "Depends": "R (>= 3.6)", + "Imports": "cli (>= 3.0.0), forcats (>= 0.2.0), hms, lifecycle, methods,\nreadr (>= 0.1.0), rlang (>= 0.4.0), tibble, tidyselect, vctrs\n(>= 0.3.0)", + "Suggests": "covr, crayon, fs, knitr, pillar (>= 1.4.0), rmarkdown,\ntestthat (>= 3.0.0), utf8", + "LinkingTo": "cpp11", + "VignetteBuilder": "knitr", + "Config/Needs/website": "tidyverse/tidytemplate", + "Config/testthat/edition": "3", + "Encoding": "UTF-8", + "RoxygenNote": "7.2.3", + "SystemRequirements": "GNU make, zlib: zlib1g-dev (deb), zlib-devel (rpm)", + "NeedsCompilation": "yes", + "Packaged": "2023-11-30 13:28:43 UTC; hadleywickham", + "Author": "Hadley Wickham [aut, cre],\n Evan Miller [aut, cph] (Author of included ReadStat code),\n Danny Smith [aut],\n Posit Software, PBC [cph, fnd]", + "Maintainer": "Hadley Wickham ", + "Repository": "RSPM", + "Date/Publication": "2023-11-30 15:10:02 UTC", + "Built": "R 4.4.0; x86_64-pc-linux-gnu; 2026-01-29 00:31:31 UTC; unix", + "RemotePkgRef": "haven@2.5.4", + "RemoteType": "standard", + "RemoteEtag": "\"e1250190cc678d7aeab0a48e28a94bf6\"", + "RemotePackaged": "TRUE", + "RemoteRef": "haven", + "RemoteRepos": "https://packagemanager.posit.co/cran/latest", + "RemotePkgPlatform": "source", + "RemoteSha": "2.5.4" + } + }, + "here": { + "Source": "CRAN", + "Repository": "https://packagemanager.posit.co/cran/latest", + "description": { + "Package": "here", + "Title": "A Simpler Way to Find Your Files", + "Version": "1.0.1", + "Date": "2020-12-13", + "Authors@R": "\n c(person(given = \"Kirill\",\n family = \"M\\u00fcller\",\n role = c(\"aut\", \"cre\"),\n email = \"krlmlr+r@mailbox.org\",\n comment = c(ORCID = \"0000-0002-1416-3412\")),\n person(given = \"Jennifer\",\n family = \"Bryan\",\n role = \"ctb\",\n email = \"jenny@rstudio.com\",\n comment = c(ORCID = \"0000-0002-6983-2759\")))", + "Description": "Constructs paths to your project's files.\n Declare the relative path of a file within your project with 'i_am()'.\n Use the 'here()' function as a drop-in replacement for 'file.path()',\n 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)", + "Suggests": "conflicted, covr, fs, knitr, palmerpenguins, plyr, readr,\nrlang, rmarkdown, testthat, uuid, withr", + "VignetteBuilder": "knitr", + "Encoding": "UTF-8", + "LazyData": "true", + "RoxygenNote": "7.1.1.9000", + "Config/testthat/edition": "3", + "NeedsCompilation": "no", + "Packaged": "2020-12-13 06:59:33 UTC; kirill", + "Author": "Kirill Müller [aut, cre] (),\n Jennifer Bryan [ctb] ()", + "Maintainer": "Kirill Müller ", + "Repository": "RSPM", + "Date/Publication": "2020-12-13 07:30:02 UTC", + "Built": "R 4.4.0; ; 2026-01-29 00:23:01 UTC; unix", + "RemotePkgRef": "here@1.0.1", + "RemoteType": "standard", + "RemoteEtag": "\"700fa7e338ccdd90a178e84686d77123\"", + "RemotePackaged": "TRUE", + "RemoteRef": "here", + "RemoteRepos": "https://packagemanager.posit.co/cran/latest", + "RemotePkgPlatform": "source", + "RemoteSha": "1.0.1" + } + }, + "highr": { + "Source": "CRAN", + "Repository": "https://packagemanager.posit.co/cran/latest", + "description": { + "Package": "highr", + "Type": "Package", + "Title": "Syntax Highlighting for R Source Code", + "Version": "0.11", + "Authors@R": "c(\n person(\"Yihui\", \"Xie\", role = c(\"aut\", \"cre\"), email = \"xie@yihui.name\", comment = c(ORCID = \"0000-0003-0645-5666\")),\n person(\"Yixuan\", \"Qiu\", role = \"aut\"),\n person(\"Christopher\", \"Gandrud\", role = \"ctb\"),\n person(\"Qiang\", \"Li\", role = \"ctb\")\n )", + "Description": "Provides syntax highlighting for R source code. Currently it\n supports LaTeX and HTML output. Source code of other languages is supported\n via Andre Simon's highlight package ().", + "Depends": "R (>= 3.3.0)", + "Imports": "xfun (>= 0.18)", + "Suggests": "knitr, markdown, testit", + "License": "GPL", + "URL": "https://github.com/yihui/highr", + "BugReports": "https://github.com/yihui/highr/issues", + "VignetteBuilder": "knitr", + "Encoding": "UTF-8", + "RoxygenNote": "7.3.1", + "NeedsCompilation": "no", + "Packaged": "2024-05-26 19:27:21 UTC; yihui", + "Author": "Yihui Xie [aut, cre] (),\n Yixuan Qiu [aut],\n Christopher Gandrud [ctb],\n Qiang Li [ctb]", + "Maintainer": "Yihui Xie ", + "Repository": "RSPM", + "Date/Publication": "2024-05-26 20:00:03 UTC", + "Built": "R 4.4.0; ; 2026-01-29 00:23:17 UTC; unix", + "RemoteType": "standard", + "RemotePkgRef": "highr", + "RemoteRef": "highr", + "RemoteRepos": "https://packagemanager.posit.co/cran/latest", + "RemotePkgPlatform": "source", + "RemoteSha": "0.11" + } + }, + "hms": { + "Source": "CRAN", + "Repository": "https://packagemanager.posit.co/cran/latest", + "description": { + "Package": "hms", + "Title": "Pretty Time of Day", + "Date": "2023-03-21", + "Version": "1.1.3", + "Authors@R": "c(\n person(\"Kirill\", \"Müller\", role = c(\"aut\", \"cre\"), email = \"kirill@cynkra.com\", comment = c(ORCID = \"0000-0002-1416-3412\")),\n person(\"R Consortium\", role = \"fnd\"),\n person(\"RStudio\", role = \"fnd\")\n )", + "Description": "Implements an S3 class for storing and formatting time-of-day\n values, based on the 'difftime' class.", + "Imports": "lifecycle, methods, pkgconfig, rlang (>= 1.0.2), vctrs (>=\n0.3.8)", + "Suggests": "crayon, lubridate, 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", + "NeedsCompilation": "no", + "Packaged": "2023-03-21 16:52:11 UTC; kirill", + "Author": "Kirill Müller [aut, cre] (),\n R Consortium [fnd],\n RStudio [fnd]", + "Maintainer": "Kirill Müller ", + "Repository": "RSPM", + "Date/Publication": "2023-03-21 18:10:02 UTC", + "Built": "R 4.4.0; ; 2026-01-29 00:25:45 UTC; unix", + "RemotePkgRef": "hms@1.1.3", + "RemoteType": "standard", + "RemoteEtag": "\"272c4647cfe64ed8ed5c6c3c22b6840d\"", + "RemotePackaged": "TRUE", + "RemoteRef": "hms", + "RemoteRepos": "https://packagemanager.posit.co/cran/latest", + "RemotePkgPlatform": "source", + "RemoteSha": "1.1.3" + } + }, + "htmltools": { + "Source": "CRAN", + "Repository": "https://packagemanager.posit.co/cran/latest", + "description": { + "Type": "Package", + "Package": "htmltools", + "Title": "Tools for HTML", + "Version": "0.5.8.1", + "Authors@R": "c(\n person(\"Joe\", \"Cheng\", , \"joe@posit.co\", role = \"aut\"),\n person(\"Carson\", \"Sievert\", , \"carson@posit.co\", role = c(\"aut\", \"cre\"),\n comment = c(ORCID = \"0000-0002-4958-2844\")),\n person(\"Barret\", \"Schloerke\", , \"barret@posit.co\", role = \"aut\",\n comment = c(ORCID = \"0000-0001-9986-114X\")),\n person(\"Winston\", \"Chang\", , \"winston@posit.co\", role = \"aut\",\n comment = c(ORCID = \"0000-0002-1576-2126\")),\n person(\"Yihui\", \"Xie\", , \"yihui@posit.co\", role = \"aut\"),\n person(\"Jeff\", \"Allen\", role = \"aut\"),\n person(\"Posit Software, PBC\", role = c(\"cph\", \"fnd\"))\n )", + "Description": "Tools for HTML generation and output.", + "License": "GPL (>= 2)", + "URL": "https://github.com/rstudio/htmltools,\nhttps://rstudio.github.io/htmltools/", + "BugReports": "https://github.com/rstudio/htmltools/issues", + "Depends": "R (>= 2.14.1)", + "Imports": "base64enc, digest, fastmap (>= 1.1.0), grDevices, rlang (>=\n1.0.0), utils", + "Suggests": "Cairo, markdown, ragg, shiny, testthat, withr", + "Enhances": "knitr", + "Config/Needs/check": "knitr", + "Config/Needs/website": "rstudio/quillt, bench", + "Encoding": "UTF-8", + "RoxygenNote": "7.3.1", + "Collate": "'colors.R' 'fill.R' 'html_dependency.R' 'html_escape.R'\n'html_print.R' 'htmltools-package.R' 'images.R' 'known_tags.R'\n'selector.R' 'staticimports.R' 'tag_query.R' 'utils.R' 'tags.R'\n'template.R'", + "NeedsCompilation": "yes", + "Packaged": "2024-04-02 14:26:15 UTC; cpsievert", + "Author": "Joe Cheng [aut],\n Carson Sievert [aut, cre] (),\n Barret Schloerke [aut] (),\n Winston Chang [aut] (),\n Yihui Xie [aut],\n Jeff Allen [aut],\n Posit Software, PBC [cph, fnd]", + "Maintainer": "Carson Sievert ", + "Repository": "RSPM", + "Date/Publication": "2024-04-04 05:03:00 UTC", + "Built": "R 4.4.0; x86_64-pc-linux-gnu; 2026-01-29 00:23:25 UTC; unix", + "RemotePkgRef": "htmltools@0.5.8.1", + "RemoteType": "standard", + "RemoteEtag": "\"b96736638725ef5d23397afb35481a88\"", + "RemotePackaged": "TRUE", + "RemoteRef": "htmltools", + "RemoteRepos": "https://packagemanager.posit.co/cran/latest", + "RemotePkgPlatform": "source", + "RemoteSha": "0.5.8.1" + } + }, + "htmlwidgets": { + "Source": "CRAN", + "Repository": "https://packagemanager.posit.co/cran/latest", + "description": { + "Type": "Package", + "Package": "htmlwidgets", + "Title": "HTML Widgets for R", + "Version": "1.6.4", + "Authors@R": "c(\n person(\"Ramnath\", \"Vaidyanathan\", role = c(\"aut\", \"cph\")),\n person(\"Yihui\", \"Xie\", role = \"aut\"),\n person(\"JJ\", \"Allaire\", role = \"aut\"),\n person(\"Joe\", \"Cheng\", , \"joe@posit.co\", role = \"aut\"),\n person(\"Carson\", \"Sievert\", , \"carson@posit.co\", role = c(\"aut\", \"cre\"),\n comment = c(ORCID = \"0000-0002-4958-2844\")),\n person(\"Kenton\", \"Russell\", role = c(\"aut\", \"cph\")),\n person(\"Ellis\", \"Hughes\", role = \"ctb\"),\n person(\"Posit Software, PBC\", role = c(\"cph\", \"fnd\"))\n )", + "Description": "A framework for creating HTML widgets that render in various\n contexts including the R console, 'R Markdown' documents, and 'Shiny'\n web applications.", + "License": "MIT + file LICENSE", + "URL": "https://github.com/ramnathv/htmlwidgets", + "BugReports": "https://github.com/ramnathv/htmlwidgets/issues", + "Imports": "grDevices, htmltools (>= 0.5.7), jsonlite (>= 0.9.16), knitr\n(>= 1.8), rmarkdown, yaml", + "Suggests": "testthat", + "Enhances": "shiny (>= 1.1)", + "VignetteBuilder": "knitr", + "Encoding": "UTF-8", + "RoxygenNote": "7.2.3", + "NeedsCompilation": "no", + "Packaged": "2023-12-06 00:11:16 UTC; cpsievert", + "Author": "Ramnath Vaidyanathan [aut, cph],\n Yihui Xie [aut],\n JJ Allaire [aut],\n Joe Cheng [aut],\n Carson Sievert [aut, cre] (),\n Kenton Russell [aut, cph],\n Ellis Hughes [ctb],\n Posit Software, PBC [cph, fnd]", + "Maintainer": "Carson Sievert ", + "Repository": "RSPM", + "Date/Publication": "2023-12-06 06:00:06 UTC", + "Built": "R 4.4.0; ; 2026-01-29 00:29:55 UTC; unix", + "RemoteType": "standard", + "RemotePkgRef": "htmlwidgets", + "RemoteRef": "htmlwidgets", + "RemoteRepos": "https://packagemanager.posit.co/cran/latest", + "RemotePkgPlatform": "source", + "RemoteSha": "1.6.4" + } + }, + "httpuv": { + "Source": "CRAN", + "Repository": "https://packagemanager.posit.co/cran/latest", + "description": { + "Type": "Package", + "Package": "httpuv", + "Title": "HTTP and WebSocket Server Library", + "Version": "1.6.15", + "Authors@R": "c(\n person(\"Joe\", \"Cheng\", , \"joe@posit.co\", role = \"aut\"),\n person(\"Winston\", \"Chang\", , \"winston@posit.co\", role = c(\"aut\", \"cre\")),\n person(\"Posit, PBC\", \"fnd\", role = \"cph\"),\n person(\"Hector\", \"Corrada Bravo\", role = \"ctb\"),\n person(\"Jeroen\", \"Ooms\", role = \"ctb\"),\n person(\"Andrzej\", \"Krzemienski\", role = \"cph\",\n comment = \"optional.hpp\"),\n person(\"libuv project contributors\", role = \"cph\",\n comment = \"libuv library, see src/libuv/AUTHORS file\"),\n person(\"Joyent, Inc. and other Node contributors\", role = \"cph\",\n comment = \"libuv library, see src/libuv/AUTHORS file; and http-parser library, see src/http-parser/AUTHORS file\"),\n person(\"Niels\", \"Provos\", role = \"cph\",\n comment = \"libuv subcomponent: tree.h\"),\n person(\"Internet Systems Consortium, Inc.\", role = \"cph\",\n comment = \"libuv subcomponent: inet_pton and inet_ntop, contained in src/libuv/src/inet.c\"),\n person(\"Alexander\", \"Chemeris\", role = \"cph\",\n comment = \"libuv subcomponent: stdint-msvc2008.h (from msinttypes)\"),\n person(\"Google, Inc.\", role = \"cph\",\n comment = \"libuv subcomponent: pthread-fixes.c\"),\n person(\"Sony Mobile Communcations AB\", role = \"cph\",\n comment = \"libuv subcomponent: pthread-fixes.c\"),\n person(\"Berkeley Software Design Inc.\", role = \"cph\",\n comment = \"libuv subcomponent: android-ifaddrs.h, android-ifaddrs.c\"),\n person(\"Kenneth\", \"MacKay\", role = \"cph\",\n comment = \"libuv subcomponent: android-ifaddrs.h, android-ifaddrs.c\"),\n person(\"Emergya (Cloud4all, FP7/2007-2013, grant agreement no 289016)\", role = \"cph\",\n comment = \"libuv subcomponent: android-ifaddrs.h, android-ifaddrs.c\"),\n person(\"Steve\", \"Reid\", role = \"aut\",\n comment = \"SHA-1 implementation\"),\n person(\"James\", \"Brown\", role = \"aut\",\n comment = \"SHA-1 implementation\"),\n person(\"Bob\", \"Trower\", role = \"aut\",\n comment = \"base64 implementation\"),\n person(\"Alexander\", \"Peslyak\", role = \"aut\",\n comment = \"MD5 implementation\"),\n person(\"Trantor Standard Systems\", role = \"cph\",\n comment = \"base64 implementation\"),\n person(\"Igor\", \"Sysoev\", role = \"cph\",\n comment = \"http-parser\")\n )", + "Description": "Provides low-level socket and protocol support for handling\n HTTP and WebSocket requests directly from within R. It is primarily\n intended as a building block for other packages, rather than making it\n particularly easy to create complete web applications using httpuv\n alone. httpuv is built on top of the libuv and http-parser C\n libraries, both of which were developed by Joyent, Inc. (See LICENSE\n file for libuv and http-parser license information.)", + "License": "GPL (>= 2) | file LICENSE", + "URL": "https://github.com/rstudio/httpuv", + "BugReports": "https://github.com/rstudio/httpuv/issues", + "Depends": "R (>= 2.15.1)", + "Imports": "later (>= 0.8.0), promises, R6, Rcpp (>= 1.0.7), utils", + "Suggests": "callr, curl, testthat, websocket", + "LinkingTo": "later, Rcpp", + "Encoding": "UTF-8", + "RoxygenNote": "7.3.1", + "SystemRequirements": "GNU make, zlib", + "Collate": "'RcppExports.R' 'httpuv.R' 'random_port.R' 'server.R'\n'staticServer.R' 'static_paths.R' 'utils.R'", + "NeedsCompilation": "yes", + "Packaged": "2024-03-25 21:06:08 UTC; cpsievert", + "Author": "Joe Cheng [aut],\n Winston Chang [aut, cre],\n Posit, PBC fnd [cph],\n Hector Corrada Bravo [ctb],\n Jeroen Ooms [ctb],\n Andrzej Krzemienski [cph] (optional.hpp),\n libuv project contributors [cph] (libuv library, see src/libuv/AUTHORS\n file),\n Joyent, Inc. and other Node contributors [cph] (libuv library, see\n src/libuv/AUTHORS file; and http-parser library, see\n src/http-parser/AUTHORS file),\n Niels Provos [cph] (libuv subcomponent: tree.h),\n Internet Systems Consortium, Inc. [cph] (libuv subcomponent: inet_pton\n and inet_ntop, contained in src/libuv/src/inet.c),\n Alexander Chemeris [cph] (libuv subcomponent: stdint-msvc2008.h (from\n msinttypes)),\n Google, Inc. [cph] (libuv subcomponent: pthread-fixes.c),\n Sony Mobile Communcations AB [cph] (libuv subcomponent:\n pthread-fixes.c),\n Berkeley Software Design Inc. [cph] (libuv subcomponent:\n android-ifaddrs.h, android-ifaddrs.c),\n Kenneth MacKay [cph] (libuv subcomponent: android-ifaddrs.h,\n android-ifaddrs.c),\n Emergya (Cloud4all, FP7/2007-2013, grant agreement no 289016) [cph]\n (libuv subcomponent: android-ifaddrs.h, android-ifaddrs.c),\n Steve Reid [aut] (SHA-1 implementation),\n James Brown [aut] (SHA-1 implementation),\n Bob Trower [aut] (base64 implementation),\n Alexander Peslyak [aut] (MD5 implementation),\n Trantor Standard Systems [cph] (base64 implementation),\n Igor Sysoev [cph] (http-parser)", + "Maintainer": "Winston Chang ", + "Repository": "RSPM", + "Date/Publication": "2024-03-26 05:50:06 UTC", + "Built": "R 4.4.0; x86_64-pc-linux-gnu; 2026-01-29 00:24:52 UTC; unix", + "RemotePkgRef": "httpuv@1.6.15", + "RemoteType": "standard", + "RemoteEtag": "\"d4a88186c4e44970f2082745cb17ac72\"", + "RemotePackaged": "TRUE", + "RemoteRef": "httpuv", + "RemoteRepos": "https://packagemanager.posit.co/cran/latest", + "RemotePkgPlatform": "source", + "RemoteSha": "1.6.15" + } + }, + "httr": { + "Source": "CRAN", + "Repository": "https://packagemanager.posit.co/cran/latest", + "description": { + "Package": "httr", + "Title": "Tools for Working with URLs and HTTP", + "Version": "1.4.7", + "Authors@R": "c(\n person(\"Hadley\", \"Wickham\", , \"hadley@posit.co\", role = c(\"aut\", \"cre\")),\n person(\"Posit, PBC\", role = c(\"cph\", \"fnd\"))\n )", + "Description": "Useful tools for working with HTTP organised by HTTP verbs\n (GET(), POST(), etc). Configuration functions make it easy to control\n additional request components (authenticate(), add_headers() and so\n on).", + "License": "MIT + file LICENSE", + "URL": "https://httr.r-lib.org/, https://github.com/r-lib/httr", + "BugReports": "https://github.com/r-lib/httr/issues", + "Depends": "R (>= 3.5)", + "Imports": "curl (>= 5.0.2), jsonlite, mime, openssl (>= 0.8), R6", + "Suggests": "covr, httpuv, jpeg, knitr, png, readr, rmarkdown, testthat\n(>= 0.8.0), xml2", + "VignetteBuilder": "knitr", + "Config/Needs/website": "tidyverse/tidytemplate", + "Encoding": "UTF-8", + "RoxygenNote": "7.2.3", + "NeedsCompilation": "no", + "Packaged": "2023-08-15 02:56:56 UTC; hadleywickham", + "Author": "Hadley Wickham [aut, cre],\n Posit, PBC [cph, fnd]", + "Maintainer": "Hadley Wickham ", + "Repository": "RSPM", + "Date/Publication": "2023-08-15 09:00:02 UTC", + "Built": "R 4.4.0; ; 2026-01-29 00:24:53 UTC; unix", + "RemoteType": "standard", + "RemotePkgRef": "httr", + "RemoteRef": "httr", + "RemoteRepos": "https://packagemanager.posit.co/cran/latest", + "RemotePkgPlatform": "source", + "RemoteSha": "1.4.7" + } + }, + "insight": { + "Source": "CRAN", + "Repository": "https://packagemanager.posit.co/cran/latest", + "description": { + "Type": "Package", + "Package": "insight", + "Title": "Easy Access to Model Information for Various Model Objects", + "Version": "1.2.0", + "Authors@R": "\n c(person(given = \"Daniel\",\n family = \"Lüdecke\",\n role = c(\"aut\", \"cre\"),\n email = \"officialeasystats@gmail.com\",\n comment = c(ORCID = \"0000-0002-8895-3206\")),\n person(given = \"Dominique\",\n family = \"Makowski\",\n role = c(\"aut\", \"ctb\"),\n email = \"dom.makowski@gmail.com\",\n comment = c(ORCID = \"0000-0001-5375-9967\")),\n person(given = \"Indrajeet\",\n family = \"Patil\",\n role = c(\"aut\", \"ctb\"),\n email = \"patilindrajeet.science@gmail.com\",\n comment = c(ORCID = \"0000-0003-1995-6531\")),\n person(given = \"Philip\",\n family = \"Waggoner\",\n role = c(\"aut\", \"ctb\"),\n email = \"philip.waggoner@gmail.com\",\n comment = c(ORCID = \"0000-0002-7825-7573\")),\n person(given = \"Mattan S.\",\n family = \"Ben-Shachar\",\n role = c(\"aut\", \"ctb\"),\n email = \"matanshm@post.bgu.ac.il\",\n comment = c(ORCID = \"0000-0002-4287-4801\")),\n person(given = \"Brenton M.\",\n family = \"Wiernik\",\n role = c(\"aut\", \"ctb\"),\n email = \"brenton@wiernik.org\",\n comment = c(ORCID = \"0000-0001-9560-6336\")),\n person(given = \"Vincent\",\n family = \"Arel-Bundock\",\n email = \"vincent.arel-bundock@umontreal.ca\",\n role = c(\"aut\", \"ctb\"),\n comment = c(ORCID = \"0000-0003-2042-7063\")),\n person(given = \"Etienne\",\n family = \"Bacher\",\n email = \"etienne.bacher@protonmail.com\",\n role = c(\"aut\", \"ctb\"),\n comment = c(ORCID = \"0000-0002-9271-5075\")),\n person(given = \"Alex\",\n family = \"Hayes\",\n role = c(\"rev\"),\n email = \"alexpghayes@gmail.com\",\n comment = c(ORCID = \"0000-0002-4985-5160\")),\n person(given = \"Grant\",\n family = \"McDermott\",\n role = c(\"ctb\"),\n email = \"grantmcd@uoregon.edu\",\n comment = c(ORCID = \"0000-0001-7883-8573\")),\n person(given = \"Rémi\",\n family = \"Thériault\",\n role = \"ctb\",\n email = \"remi.theriault@mail.mcgill.ca\",\n comment = c(ORCID = \"0000-0003-4315-6788\")),\n person(given = \"Alex\",\n family = \"Reinhart\",\n role = \"ctb\",\n email = \"areinhar@stat.cmu.edu\",\n comment = c(ORCID = \"0000-0002-6658-514X\")))", + "Maintainer": "Daniel Lüdecke ", + "Description": "A tool to provide an easy, intuitive and consistent\n access to information contained in various R models, like model\n formulas, model terms, information about random effects, data that was\n used to fit the model or data from response variables. 'insight'\n mainly revolves around two types of functions: Functions that find\n (the names of) information, starting with 'find_', and functions that\n get the underlying data, starting with 'get_'. The package has a\n consistent syntax and works with many different model objects, where\n otherwise functions to access these information are missing.", + "License": "GPL-3", + "URL": "https://easystats.github.io/insight/", + "BugReports": "https://github.com/easystats/insight/issues", + "Depends": "R (>= 3.6)", + "Imports": "methods, stats, utils", + "Suggests": "AER, afex, aod, ape, BayesFactor, bayestestR, bbmle,\nbdsmatrix, betareg, bife, biglm, BH, blavaan (>= 0.5-5), blme,\nboot, brms, broom, car, carData, censReg, cgam, clubSandwich,\ncobalt, coxme, cplm, crch, curl, datawizard, effectsize,\nemmeans, epiR, estimatr, feisr, fixest (>= 0.11.2), fungible,\nfwb, gam, gamlss, gamlss.data, gamm4, gbm, gee, geepack, geoR,\nGLMMadaptive, glmmTMB (>= 1.1.10), glmtoolbox, gmnl, grDevices,\ngt, httptest2, httr2, interp, ivreg, JM, knitr, lavaan,\nlavaSearch2, lfe, lme4, lmerTest, lmtest, logistf, logitr,\nmarginaleffects (>= 0.25.0), MASS, Matrix, mclogit, mclust,\nMCMCglmm, merTools, metaBMA, metadat, metafor, metaplus, mgcv,\nmice (>= 3.17.0), mlogit, mmrm, modelbased (>= 0.9.0), multgee,\nMuMIn, nestedLogit, nlme, nnet, nonnest2, ordinal, panelr,\nparameters, parsnip, pbkrtest, performance, phylolm, plm,\npoorman, PROreg (>= 1.3.0), pscl, psych, quantreg, Rcpp,\nRcppEigen, rmarkdown, rms, robustbase, robustlmm, rpart,\nrstanarm (>= 2.21.1), rstantools (>= 2.1.0), rstudioapi,\nRWiener, sandwich, serp, speedglm, splines, statmod, survey,\nsurvival, svylme, testthat, tinytable (>= 0.8.0), TMB,\ntruncreg, tune, tweedie, VGAM, WeightIt, withr", + "VignetteBuilder": "knitr", + "Encoding": "UTF-8", + "Language": "en-US", + "RoxygenNote": "7.3.2", + "Config/testthat/edition": "3", + "Config/testthat/parallel": "true", + "Config/Needs/website": "easystats/easystatstemplate", + "Config/Needs/check": "stan-dev/cmdstanr", + "NeedsCompilation": "no", + "Packaged": "2025-04-22 12:50:25 UTC; mail", + "Author": "Daniel Lüdecke [aut, cre] (),\n Dominique Makowski [aut, ctb] (),\n Indrajeet Patil [aut, ctb] (),\n Philip Waggoner [aut, ctb] (),\n Mattan S. Ben-Shachar [aut, ctb]\n (),\n Brenton M. Wiernik [aut, ctb] (),\n Vincent Arel-Bundock [aut, ctb]\n (),\n Etienne Bacher [aut, ctb] (),\n Alex Hayes [rev] (),\n Grant McDermott [ctb] (),\n Rémi Thériault [ctb] (),\n Alex Reinhart [ctb] ()", + "Repository": "RSPM", + "Date/Publication": "2025-04-22 21:50:01 UTC", + "Built": "R 4.4.0; ; 2026-01-29 00:21:24 UTC; unix", + "RemotePkgRef": "insight@1.2.0", + "RemoteType": "standard", + "RemoteEtag": "\"18261c7b8b6ff4854200cf2b973dcf90\"", + "RemotePackaged": "TRUE", + "RemoteRef": "insight", + "RemoteRepos": "https://packagemanager.posit.co/cran/latest", + "RemotePkgPlatform": "source", + "RemoteSha": "1.2.0" + } + }, + "isoband": { + "Source": "CRAN", + "Repository": "https://packagemanager.posit.co/cran/latest", + "description": { + "Package": "isoband", + "Title": "Generate Isolines and Isobands from Regularly Spaced Elevation\nGrids", + "Version": "0.2.7", + "Authors@R": "c(\n person(\"Hadley\", \"Wickham\", , \"hadley@posit.co\", role = c(\"aut\", \"cre\"),\n comment = c(ORCID = \"0000-0003-4757-117X\")),\n person(\"Claus O.\", \"Wilke\", , \"wilke@austin.utexas.edu\", role = \"aut\",\n comment = c(\"Original author\", ORCID = \"0000-0002-7470-9261\")),\n person(\"Thomas Lin\", \"Pedersen\", , \"thomasp85@gmail.com\", role = \"aut\",\n comment = c(ORCID = \"0000-0002-5147-4711\"))\n )", + "Description": "A fast C++ implementation to generate contour lines\n (isolines) and contour polygons (isobands) from regularly spaced grids\n containing elevation data.", + "License": "MIT + file LICENSE", + "URL": "https://isoband.r-lib.org", + "BugReports": "https://github.com/r-lib/isoband/issues", + "Imports": "grid, utils", + "Suggests": "covr, ggplot2, knitr, magick, microbenchmark, rmarkdown, sf,\ntestthat, xml2", + "VignetteBuilder": "knitr", + "Config/Needs/website": "tidyverse/tidytemplate", + "Config/testthat/edition": "3", + "Encoding": "UTF-8", + "RoxygenNote": "7.2.3", + "SystemRequirements": "C++11", + "NeedsCompilation": "yes", + "Packaged": "2022-12-19 20:10:02 UTC; hadleywickham", + "Author": "Hadley Wickham [aut, cre] (),\n Claus O. Wilke [aut] (Original author,\n ),\n Thomas Lin Pedersen [aut] ()", + "Maintainer": "Hadley Wickham ", + "Repository": "RSPM", + "Date/Publication": "2022-12-20 10:00:13 UTC", + "Built": "R 4.4.0; x86_64-pc-linux-gnu; 2026-01-29 00:21:21 UTC; unix", + "RemotePkgRef": "isoband@0.2.7", + "RemoteType": "standard", + "RemoteEtag": "\"d4491336725fd316a289bc584db363ee\"", + "RemotePackaged": "TRUE", + "RemoteRef": "isoband", + "RemoteRepos": "https://packagemanager.posit.co/cran/latest", + "RemotePkgPlatform": "source", + "RemoteSha": "0.2.7" + } + }, + "jquerylib": { + "Source": "CRAN", + "Repository": "https://packagemanager.posit.co/cran/latest", + "description": { + "Package": "jquerylib", + "Title": "Obtain 'jQuery' as an HTML Dependency Object", + "Version": "0.1.4", + "Authors@R": "c(\n person(\"Carson\", \"Sievert\", role = c(\"aut\", \"cre\"), email = \"carson@rstudio.com\", comment = c(ORCID = \"0000-0002-4958-2844\")),\n person(\"Joe\", \"Cheng\", role = \"aut\", email = \"joe@rstudio.com\"),\n person(family = \"RStudio\", role = \"cph\"),\n person(family = \"jQuery Foundation\", role = \"cph\",\n comment = \"jQuery library and jQuery UI library\"),\n person(family = \"jQuery contributors\", role = c(\"ctb\", \"cph\"),\n comment = \"jQuery library; authors listed in inst/lib/jquery-AUTHORS.txt\")\n )", + "Description": "Obtain any major version of 'jQuery' () and use it in any webpage generated by 'htmltools' (e.g. 'shiny', 'htmlwidgets', and 'rmarkdown').\n Most R users don't need to use this package directly, but other R packages (e.g. 'shiny', 'rmarkdown', etc.) depend on this package to avoid bundling redundant copies of 'jQuery'.", + "License": "MIT + file LICENSE", + "Encoding": "UTF-8", + "Config/testthat/edition": "3", + "RoxygenNote": "7.0.2", + "Imports": "htmltools", + "Suggests": "testthat", + "NeedsCompilation": "no", + "Packaged": "2021-04-26 16:40:21 UTC; cpsievert", + "Author": "Carson Sievert [aut, cre] (),\n Joe Cheng [aut],\n RStudio [cph],\n jQuery Foundation [cph] (jQuery library and jQuery UI library),\n jQuery contributors [ctb, cph] (jQuery library; authors listed in\n inst/lib/jquery-AUTHORS.txt)", + "Maintainer": "Carson Sievert ", + "Repository": "RSPM", + "Date/Publication": "2021-04-26 17:10:02 UTC", + "Built": "R 4.4.0; ; 2026-01-29 00:23:57 UTC; unix", + "RemoteType": "standard", + "RemotePkgRef": "jquerylib", + "RemoteRef": "jquerylib", + "RemoteRepos": "https://packagemanager.posit.co/cran/latest", + "RemotePkgPlatform": "source", + "RemoteSha": "0.1.4" + } + }, + "jsonlite": { + "Source": "CRAN", + "Repository": "https://packagemanager.posit.co/cran/latest", + "description": { + "Package": "jsonlite", + "Version": "2.0.0", + "Title": "A Simple and Robust JSON Parser and Generator for R", + "License": "MIT + file LICENSE", + "Depends": "methods", + "Authors@R": "c(\n person(\"Jeroen\", \"Ooms\", role = c(\"aut\", \"cre\"), email = \"jeroenooms@gmail.com\",\n comment = c(ORCID = \"0000-0002-4035-0289\")),\n person(\"Duncan\", \"Temple Lang\", role = \"ctb\"),\n person(\"Lloyd\", \"Hilaiel\", role = \"cph\", comment=\"author of bundled libyajl\"))", + "URL": "https://jeroen.r-universe.dev/jsonlite\nhttps://arxiv.org/abs/1403.2805", + "BugReports": "https://github.com/jeroen/jsonlite/issues", + "Maintainer": "Jeroen Ooms ", + "VignetteBuilder": "knitr, R.rsp", + "Description": "A reasonably fast JSON parser and generator, optimized for statistical \n data and the web. Offers simple, flexible tools for working with JSON in R, and\n is particularly powerful for building pipelines and interacting with a web API. \n The implementation is based on the mapping described in the vignette (Ooms, 2014).\n In addition to converting JSON data from/to R objects, 'jsonlite' contains \n functions to stream, validate, and prettify JSON data. The unit tests included \n with the package verify that all edge cases are encoded and decoded consistently \n for use with dynamic data in systems and applications.", + "Suggests": "httr, vctrs, testthat, knitr, rmarkdown, R.rsp, sf", + "RoxygenNote": "7.3.2", + "Encoding": "UTF-8", + "NeedsCompilation": "yes", + "Packaged": "2025-03-26 11:36:10 UTC; jeroen", + "Author": "Jeroen Ooms [aut, cre] (),\n Duncan Temple Lang [ctb],\n Lloyd Hilaiel [cph] (author of bundled libyajl)", + "Repository": "RSPM", + "Date/Publication": "2025-03-27 06:40:02 UTC", + "Built": "R 4.4.0; x86_64-pc-linux-gnu; 2026-01-29 00:21:06 UTC; unix", + "RemoteType": "standard", + "RemotePkgRef": "jsonlite", + "RemoteRef": "jsonlite", + "RemoteRepos": "https://packagemanager.posit.co/cran/latest", + "RemotePkgPlatform": "source", + "RemoteSha": "2.0.0" + } + }, + "juicyjuice": { + "Source": "CRAN", + "Repository": "https://packagemanager.posit.co/cran/latest", + "description": { + "Package": "juicyjuice", + "Title": "Inline CSS Properties into HTML Tags Using 'juice'", + "Version": "0.1.0", + "Authors@R": "c(\n person(\"Richard\", \"Iannone\", , \"riannone@me.com\", c(\"aut\", \"cre\", \"cph\"),\n comment = c(ORCID = \"0000-0003-3925-190X\")),\n person(\"Automattic\", role = c(\"cph\"), comment = \"juice library\"),\n person(\"juice contributors\", role = c(\"ctb\"), comment = \"juice library\")\n )", + "Description": "There are occasions where you need a piece of HTML with integrated\n styles. A prime example of this is HTML email. This transformation\n involves moving the CSS and associated formatting instructions from the\n style block in the head of your document into the body of the HTML. Many\n prominent email clients require integrated styles in HTML email; otherwise a\n received HTML email will be displayed without any styling. This package will\n quickly and precisely perform these CSS transformations when given HTML text\n and it does so by using the JavaScript 'juice' library.", + "License": "MIT + file LICENSE", + "URL": "https://github.com/rich-iannone/juicyjuice", + "BugReports": "https://github.com/rich-iannone/juicyjuice/issues", + "Encoding": "UTF-8", + "RoxygenNote": "7.2.1", + "Imports": "V8 (>= 4.2.0)", + "Suggests": "testthat (>= 3.0.0)", + "Config/testthat/edition": "3", + "NeedsCompilation": "no", + "Packaged": "2022-11-09 19:42:30 UTC; rich", + "Author": "Richard Iannone [aut, cre, cph]\n (),\n Automattic [cph] (juice library),\n juice contributors [ctb] (juice library)", + "Maintainer": "Richard Iannone ", + "Repository": "RSPM", + "Date/Publication": "2022-11-10 19:00:02 UTC", + "Built": "R 4.4.0; ; 2026-01-29 00:24:44 UTC; unix", + "RemotePkgRef": "juicyjuice@0.1.0", + "RemoteType": "standard", + "RemoteEtag": "\"7095fab37adddd54bc12c30a039cf9e4\"", + "RemotePackaged": "TRUE", + "RemoteRef": "juicyjuice", + "RemoteRepos": "https://packagemanager.posit.co/cran/latest", + "RemotePkgPlatform": "source", + "RemoteSha": "0.1.0" + } + }, + "knitr": { + "Source": "CRAN", + "Repository": "https://packagemanager.posit.co/cran/latest", + "description": { + "Package": "knitr", + "Type": "Package", + "Title": "A General-Purpose Package for Dynamic Report Generation in R", + "Version": "1.50", + "Authors@R": "c(\n person(\"Yihui\", \"Xie\", role = c(\"aut\", \"cre\"), email = \"xie@yihui.name\", comment = c(ORCID = \"0000-0003-0645-5666\", URL = \"https://yihui.org\")),\n person(\"Abhraneel\", \"Sarma\", role = \"ctb\"),\n person(\"Adam\", \"Vogt\", role = \"ctb\"),\n person(\"Alastair\", \"Andrew\", role = \"ctb\"),\n person(\"Alex\", \"Zvoleff\", role = \"ctb\"),\n person(\"Amar\", \"Al-Zubaidi\", role = \"ctb\"),\n person(\"Andre\", \"Simon\", role = \"ctb\", comment = \"the CSS files under inst/themes/ were derived from the Highlight package http://www.andre-simon.de\"),\n person(\"Aron\", \"Atkins\", role = \"ctb\"),\n person(\"Aaron\", \"Wolen\", role = \"ctb\"),\n person(\"Ashley\", \"Manton\", role = \"ctb\"),\n person(\"Atsushi\", \"Yasumoto\", role = \"ctb\", comment = c(ORCID = \"0000-0002-8335-495X\")),\n person(\"Ben\", \"Baumer\", role = \"ctb\"),\n person(\"Brian\", \"Diggs\", role = \"ctb\"),\n person(\"Brian\", \"Zhang\", role = \"ctb\"),\n person(\"Bulat\", \"Yapparov\", role = \"ctb\"),\n person(\"Cassio\", \"Pereira\", role = \"ctb\"),\n person(\"Christophe\", \"Dervieux\", role = \"ctb\"),\n person(\"David\", \"Hall\", role = \"ctb\"),\n person(\"David\", \"Hugh-Jones\", role = \"ctb\"),\n person(\"David\", \"Robinson\", role = \"ctb\"),\n person(\"Doug\", \"Hemken\", role = \"ctb\"),\n person(\"Duncan\", \"Murdoch\", role = \"ctb\"),\n person(\"Elio\", \"Campitelli\", role = \"ctb\"),\n person(\"Ellis\", \"Hughes\", role = \"ctb\"),\n person(\"Emily\", \"Riederer\", role = \"ctb\"),\n person(\"Fabian\", \"Hirschmann\", role = \"ctb\"),\n person(\"Fitch\", \"Simeon\", role = \"ctb\"),\n person(\"Forest\", \"Fang\", role = \"ctb\"),\n person(c(\"Frank\", \"E\", \"Harrell\", \"Jr\"), role = \"ctb\", comment = \"the Sweavel package at inst/misc/Sweavel.sty\"),\n person(\"Garrick\", \"Aden-Buie\", role = \"ctb\"),\n person(\"Gregoire\", \"Detrez\", role = \"ctb\"),\n person(\"Hadley\", \"Wickham\", role = \"ctb\"),\n person(\"Hao\", \"Zhu\", role = \"ctb\"),\n person(\"Heewon\", \"Jeon\", role = \"ctb\"),\n person(\"Henrik\", \"Bengtsson\", role = \"ctb\"),\n person(\"Hiroaki\", \"Yutani\", role = \"ctb\"),\n person(\"Ian\", \"Lyttle\", role = \"ctb\"),\n person(\"Hodges\", \"Daniel\", role = \"ctb\"),\n person(\"Jacob\", \"Bien\", role = \"ctb\"),\n person(\"Jake\", \"Burkhead\", role = \"ctb\"),\n person(\"James\", \"Manton\", role = \"ctb\"),\n person(\"Jared\", \"Lander\", role = \"ctb\"),\n person(\"Jason\", \"Punyon\", role = \"ctb\"),\n person(\"Javier\", \"Luraschi\", role = \"ctb\"),\n person(\"Jeff\", \"Arnold\", role = \"ctb\"),\n person(\"Jenny\", \"Bryan\", role = \"ctb\"),\n person(\"Jeremy\", \"Ashkenas\", role = c(\"ctb\", \"cph\"), comment = \"the CSS file at inst/misc/docco-classic.css\"),\n person(\"Jeremy\", \"Stephens\", role = \"ctb\"),\n person(\"Jim\", \"Hester\", role = \"ctb\"),\n person(\"Joe\", \"Cheng\", role = \"ctb\"),\n person(\"Johannes\", \"Ranke\", role = \"ctb\"),\n person(\"John\", \"Honaker\", role = \"ctb\"),\n person(\"John\", \"Muschelli\", role = \"ctb\"),\n person(\"Jonathan\", \"Keane\", role = \"ctb\"),\n person(\"JJ\", \"Allaire\", role = \"ctb\"),\n person(\"Johan\", \"Toloe\", role = \"ctb\"),\n person(\"Jonathan\", \"Sidi\", role = \"ctb\"),\n person(\"Joseph\", \"Larmarange\", role = \"ctb\"),\n person(\"Julien\", \"Barnier\", role = \"ctb\"),\n person(\"Kaiyin\", \"Zhong\", role = \"ctb\"),\n person(\"Kamil\", \"Slowikowski\", role = \"ctb\"),\n person(\"Karl\", \"Forner\", role = \"ctb\"),\n person(c(\"Kevin\", \"K.\"), \"Smith\", role = \"ctb\"),\n person(\"Kirill\", \"Mueller\", role = \"ctb\"),\n person(\"Kohske\", \"Takahashi\", role = \"ctb\"),\n person(\"Lorenz\", \"Walthert\", role = \"ctb\"),\n person(\"Lucas\", \"Gallindo\", role = \"ctb\"),\n person(\"Marius\", \"Hofert\", role = \"ctb\"),\n person(\"Martin\", \"Modrák\", role = \"ctb\"),\n person(\"Michael\", \"Chirico\", role = \"ctb\"),\n person(\"Michael\", \"Friendly\", role = \"ctb\"),\n person(\"Michal\", \"Bojanowski\", role = \"ctb\"),\n person(\"Michel\", \"Kuhlmann\", role = \"ctb\"),\n person(\"Miller\", \"Patrick\", role = \"ctb\"),\n person(\"Nacho\", \"Caballero\", role = \"ctb\"),\n person(\"Nick\", \"Salkowski\", role = \"ctb\"),\n person(\"Niels Richard\", \"Hansen\", role = \"ctb\"),\n person(\"Noam\", \"Ross\", role = \"ctb\"),\n person(\"Obada\", \"Mahdi\", role = \"ctb\"),\n person(\"Pavel N.\", \"Krivitsky\", role = \"ctb\", comment=c(ORCID = \"0000-0002-9101-3362\")),\n person(\"Pedro\", \"Faria\", role = \"ctb\"),\n person(\"Qiang\", \"Li\", role = \"ctb\"),\n person(\"Ramnath\", \"Vaidyanathan\", role = \"ctb\"),\n person(\"Richard\", \"Cotton\", role = \"ctb\"),\n person(\"Robert\", \"Krzyzanowski\", role = \"ctb\"),\n person(\"Rodrigo\", \"Copetti\", role = \"ctb\"),\n person(\"Romain\", \"Francois\", role = \"ctb\"),\n person(\"Ruaridh\", \"Williamson\", role = \"ctb\"),\n person(\"Sagiru\", \"Mati\", role = \"ctb\", comment = c(ORCID = \"0000-0003-1413-3974\")),\n person(\"Scott\", \"Kostyshak\", role = \"ctb\"),\n person(\"Sebastian\", \"Meyer\", role = \"ctb\"),\n person(\"Sietse\", \"Brouwer\", role = \"ctb\"),\n person(c(\"Simon\", \"de\"), \"Bernard\", role = \"ctb\"),\n person(\"Sylvain\", \"Rousseau\", role = \"ctb\"),\n person(\"Taiyun\", \"Wei\", role = \"ctb\"),\n person(\"Thibaut\", \"Assus\", role = \"ctb\"),\n person(\"Thibaut\", \"Lamadon\", role = \"ctb\"),\n person(\"Thomas\", \"Leeper\", role = \"ctb\"),\n person(\"Tim\", \"Mastny\", role = \"ctb\"),\n person(\"Tom\", \"Torsney-Weir\", role = \"ctb\"),\n person(\"Trevor\", \"Davis\", role = \"ctb\"),\n person(\"Viktoras\", \"Veitas\", role = \"ctb\"),\n person(\"Weicheng\", \"Zhu\", role = \"ctb\"),\n person(\"Wush\", \"Wu\", role = \"ctb\"),\n person(\"Zachary\", \"Foster\", role = \"ctb\"),\n person(\"Zhian N.\", \"Kamvar\", role = \"ctb\", comment = c(ORCID = \"0000-0003-1458-7108\")),\n person(given = \"Posit Software, PBC\", role = c(\"cph\", \"fnd\"))\n )", + "Description": "Provides a general-purpose tool for dynamic report generation in R\n using Literate Programming techniques.", + "Depends": "R (>= 3.6.0)", + "Imports": "evaluate (>= 0.15), highr (>= 0.11), methods, tools, xfun (>=\n0.51), yaml (>= 2.1.19)", + "Suggests": "bslib, codetools, DBI (>= 0.4-1), digest, formatR, gifski,\ngridSVG, htmlwidgets (>= 0.7), jpeg, JuliaCall (>= 0.11.1),\nmagick, litedown, markdown (>= 1.3), png, ragg, reticulate (>=\n1.4), rgl (>= 0.95.1201), rlang, rmarkdown, sass, showtext,\nstyler (>= 1.2.0), targets (>= 0.6.0), testit, tibble,\ntikzDevice (>= 0.10), tinytex (>= 0.56), webshot, rstudioapi,\nsvglite", + "License": "GPL", + "URL": "https://yihui.org/knitr/", + "BugReports": "https://github.com/yihui/knitr/issues", + "Encoding": "UTF-8", + "VignetteBuilder": "litedown, knitr", + "SystemRequirements": "Package vignettes based on R Markdown v2 or\nreStructuredText require Pandoc (http://pandoc.org). The\nfunction rst2pdf() requires rst2pdf\n(https://github.com/rst2pdf/rst2pdf).", + "Collate": "'block.R' 'cache.R' 'citation.R' 'hooks-html.R' 'plot.R'\n'utils.R' 'defaults.R' 'concordance.R' 'engine.R' 'highlight.R'\n'themes.R' 'header.R' 'hooks-asciidoc.R' 'hooks-chunk.R'\n'hooks-extra.R' 'hooks-latex.R' 'hooks-md.R' 'hooks-rst.R'\n'hooks-textile.R' 'hooks.R' 'output.R' 'package.R' 'pandoc.R'\n'params.R' 'parser.R' 'pattern.R' 'rocco.R' 'spin.R' 'table.R'\n'template.R' 'utils-conversion.R' 'utils-rd2html.R'\n'utils-string.R' 'utils-sweave.R' 'utils-upload.R'\n'utils-vignettes.R' 'zzz.R'", + "RoxygenNote": "7.3.2", + "NeedsCompilation": "no", + "Packaged": "2025-03-15 00:17:19 UTC; runner", + "Author": "Yihui Xie [aut, cre] (,\n https://yihui.org),\n Abhraneel Sarma [ctb],\n Adam Vogt [ctb],\n Alastair Andrew [ctb],\n Alex Zvoleff [ctb],\n Amar Al-Zubaidi [ctb],\n Andre Simon [ctb] (the CSS files under inst/themes/ were derived from\n the Highlight package http://www.andre-simon.de),\n Aron Atkins [ctb],\n Aaron Wolen [ctb],\n Ashley Manton [ctb],\n Atsushi Yasumoto [ctb] (),\n Ben Baumer [ctb],\n Brian Diggs [ctb],\n Brian Zhang [ctb],\n Bulat Yapparov [ctb],\n Cassio Pereira [ctb],\n Christophe Dervieux [ctb],\n David Hall [ctb],\n David Hugh-Jones [ctb],\n David Robinson [ctb],\n Doug Hemken [ctb],\n Duncan Murdoch [ctb],\n Elio Campitelli [ctb],\n Ellis Hughes [ctb],\n Emily Riederer [ctb],\n Fabian Hirschmann [ctb],\n Fitch Simeon [ctb],\n Forest Fang [ctb],\n Frank E Harrell Jr [ctb] (the Sweavel package at inst/misc/Sweavel.sty),\n Garrick Aden-Buie [ctb],\n Gregoire Detrez [ctb],\n Hadley Wickham [ctb],\n Hao Zhu [ctb],\n Heewon Jeon [ctb],\n Henrik Bengtsson [ctb],\n Hiroaki Yutani [ctb],\n Ian Lyttle [ctb],\n Hodges Daniel [ctb],\n Jacob Bien [ctb],\n Jake Burkhead [ctb],\n James Manton [ctb],\n Jared Lander [ctb],\n Jason Punyon [ctb],\n Javier Luraschi [ctb],\n Jeff Arnold [ctb],\n Jenny Bryan [ctb],\n Jeremy Ashkenas [ctb, cph] (the CSS file at\n inst/misc/docco-classic.css),\n Jeremy Stephens [ctb],\n Jim Hester [ctb],\n Joe Cheng [ctb],\n Johannes Ranke [ctb],\n John Honaker [ctb],\n John Muschelli [ctb],\n Jonathan Keane [ctb],\n JJ Allaire [ctb],\n Johan Toloe [ctb],\n Jonathan Sidi [ctb],\n Joseph Larmarange [ctb],\n Julien Barnier [ctb],\n Kaiyin Zhong [ctb],\n Kamil Slowikowski [ctb],\n Karl Forner [ctb],\n Kevin K. Smith [ctb],\n Kirill Mueller [ctb],\n Kohske Takahashi [ctb],\n Lorenz Walthert [ctb],\n Lucas Gallindo [ctb],\n Marius Hofert [ctb],\n Martin Modrák [ctb],\n Michael Chirico [ctb],\n Michael Friendly [ctb],\n Michal Bojanowski [ctb],\n Michel Kuhlmann [ctb],\n Miller Patrick [ctb],\n Nacho Caballero [ctb],\n Nick Salkowski [ctb],\n Niels Richard Hansen [ctb],\n Noam Ross [ctb],\n Obada Mahdi [ctb],\n Pavel N. Krivitsky [ctb] (),\n Pedro Faria [ctb],\n Qiang Li [ctb],\n Ramnath Vaidyanathan [ctb],\n Richard Cotton [ctb],\n Robert Krzyzanowski [ctb],\n Rodrigo Copetti [ctb],\n Romain Francois [ctb],\n Ruaridh Williamson [ctb],\n Sagiru Mati [ctb] (),\n Scott Kostyshak [ctb],\n Sebastian Meyer [ctb],\n Sietse Brouwer [ctb],\n Simon de Bernard [ctb],\n Sylvain Rousseau [ctb],\n Taiyun Wei [ctb],\n Thibaut Assus [ctb],\n Thibaut Lamadon [ctb],\n Thomas Leeper [ctb],\n Tim Mastny [ctb],\n Tom Torsney-Weir [ctb],\n Trevor Davis [ctb],\n Viktoras Veitas [ctb],\n Weicheng Zhu [ctb],\n Wush Wu [ctb],\n Zachary Foster [ctb],\n Zhian N. Kamvar [ctb] (),\n Posit Software, PBC [cph, fnd]", + "Maintainer": "Yihui Xie ", + "Repository": "RSPM", + "Date/Publication": "2025-03-16 09:20:02 UTC", + "Built": "R 4.4.0; ; 2026-01-29 00:24:48 UTC; unix", + "RemotePkgRef": "knitr@1.50", + "RemoteType": "standard", + "RemoteEtag": "\"6aa092f4abbaf03fb1ab83c4c15c74f7\"", + "RemotePackaged": "TRUE", + "RemoteRef": "knitr", + "RemoteRepos": "https://packagemanager.posit.co/cran/latest", + "RemotePkgPlatform": "source", + "RemoteSha": "1.50" + } + }, + "labeling": { + "Source": "CRAN", + "Repository": "https://packagemanager.posit.co/cran/latest", + "description": { + "Package": "labeling", + "Type": "Package", + "Title": "Axis Labeling", + "Version": "0.4.3", + "Date": "2023-08-29", + "Author": "Justin Talbot,", + "Maintainer": "Nuno Sempere ", + "Description": "Functions which provide a range of axis labeling algorithms. ", + "License": "MIT + file LICENSE | Unlimited", + "Collate": "'labeling.R'", + "NeedsCompilation": "no", + "Imports": "stats, graphics", + "Packaged": "2023-08-29 21:01:57 UTC; loki", + "Repository": "RSPM", + "Date/Publication": "2023-08-29 22:20:02 UTC", + "Encoding": "UTF-8", + "Built": "R 4.4.0; ; 2026-01-29 00:21:16 UTC; unix", + "RemoteType": "standard", + "RemotePkgRef": "labeling", + "RemoteRef": "labeling", + "RemoteRepos": "https://packagemanager.posit.co/cran/latest", + "RemotePkgPlatform": "source", + "RemoteSha": "0.4.3" + } + }, + "labelled": { + "Source": "CRAN", + "Repository": "https://packagemanager.posit.co/cran/latest", + "description": { + "Package": "labelled", + "Type": "Package", + "Title": "Manipulating Labelled Data", + "Version": "2.14.1", + "Maintainer": "Joseph Larmarange ", + "Authors@R": "c(\n person(\"Joseph\", \"Larmarange\", email = \"joseph@larmarange.net\", role = c(\"aut\", \"cre\"), comment = c(ORCID = \"0000-0001-7097-700X\")),\n person(\"Daniel\", \"Ludecke\", role = \"ctb\"),\n person(\"Hadley\", \"Wickham\", role = \"ctb\"),\n person(\"Michal\", \"Bojanowski\", role = \"ctb\"),\n person(\"François\", \"Briatte\", role = \"ctb\")\n )", + "Description": "Work with labelled data imported from 'SPSS'\n or 'Stata' with 'haven' or 'foreign'. This package\n provides useful functions to deal with \"haven_labelled\" and\n \"haven_labelled_spss\" classes introduced by 'haven' package.", + "License": "GPL (>= 3)", + "Encoding": "UTF-8", + "Depends": "R (>= 3.2)", + "Imports": "haven (>= 2.4.1), cli, dplyr (>= 1.1.0), lifecycle, rlang (>=\n1.1.0), vctrs, stringr, tidyr, tidyselect", + "Suggests": "testthat (>= 3.2.0), knitr, rmarkdown, questionr, snakecase,\nspelling", + "Enhances": "memisc", + "URL": "https://larmarange.github.io/labelled/,\nhttps://github.com/larmarange/labelled", + "BugReports": "https://github.com/larmarange/labelled/issues", + "VignetteBuilder": "knitr", + "LazyData": "true", + "RoxygenNote": "7.3.2", + "Language": "en-US", + "Config/testthat/edition": "3", + "Config/Needs/check": "memisc", + "NeedsCompilation": "no", + "Packaged": "2025-05-06 18:26:13 UTC; josep", + "Author": "Joseph Larmarange [aut, cre] (ORCID:\n ),\n Daniel Ludecke [ctb],\n Hadley Wickham [ctb],\n Michal Bojanowski [ctb],\n François Briatte [ctb]", + "Repository": "RSPM", + "Date/Publication": "2025-05-06 19:00:02 UTC", + "Built": "R 4.4.0; ; 2026-01-29 00:32:09 UTC; unix", + "RemotePkgRef": "labelled@2.14.1", + "RemoteType": "standard", + "RemoteEtag": "\"0a1dbf776f111c53b19b7288c85f7f04\"", + "RemotePackaged": "TRUE", + "RemoteRef": "labelled", + "RemoteRepos": "https://packagemanager.posit.co/cran/latest", + "RemotePkgPlatform": "source", + "RemoteSha": "2.14.1" + } + }, + "later": { + "Source": "CRAN", + "Repository": "https://packagemanager.posit.co/cran/latest", + "description": { + "Package": "later", + "Type": "Package", + "Title": "Utilities for Scheduling Functions to Execute Later with Event\nLoops", + "Version": "1.4.2", + "Authors@R": "c(\n person(\"Winston\", \"Chang\", role = c(\"aut\", \"cre\"), email = \"winston@posit.co\"),\n person(\"Joe\", \"Cheng\", role = c(\"aut\"), email = \"joe@posit.co\"),\n person(\"Charlie\", \"Gao\", role = c(\"aut\"), email = \"charlie.gao@shikokuchuo.net\", comment = c(ORCID = \"0000-0002-0750-061X\")),\n person(family = \"Posit Software, PBC\", role = \"cph\"),\n person(\"Marcus\", \"Geelnard\", role = c(\"ctb\", \"cph\"), comment = \"TinyCThread library, https://tinycthread.github.io/\"),\n person(\"Evan\", \"Nemerson\", role = c(\"ctb\", \"cph\"), comment = \"TinyCThread library, https://tinycthread.github.io/\")\n )", + "Description": "Executes arbitrary R or C functions some time after the current\n time, after the R execution stack has emptied. The functions are scheduled\n 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", + "Imports": "Rcpp (>= 0.12.9), rlang", + "LinkingTo": "Rcpp", + "RoxygenNote": "7.3.2", + "Suggests": "knitr, nanonext, R6, rmarkdown, testthat (>= 2.1.0)", + "VignetteBuilder": "knitr", + "Encoding": "UTF-8", + "NeedsCompilation": "yes", + "Packaged": "2025-04-07 20:25:00 UTC; cg334", + "Author": "Winston Chang [aut, cre],\n Joe Cheng [aut],\n Charlie Gao [aut] (),\n Posit Software, PBC [cph],\n Marcus Geelnard [ctb, cph] (TinyCThread library,\n https://tinycthread.github.io/),\n Evan Nemerson [ctb, cph] (TinyCThread library,\n https://tinycthread.github.io/)", + "Maintainer": "Winston Chang ", + "Repository": "RSPM", + "Date/Publication": "2025-04-08 08:50:01 UTC", + "Built": "R 4.4.0; x86_64-pc-linux-gnu; 2026-01-29 00:23:35 UTC; unix", + "RemotePkgRef": "later@1.4.2", + "RemoteType": "standard", + "RemoteEtag": "\"81ee301855210389ecb0eed2100a31b2\"", + "RemotePackaged": "TRUE", + "RemoteRef": "later", + "RemoteRepos": "https://packagemanager.posit.co/cran/latest", + "RemotePkgPlatform": "source", + "RemoteSha": "1.4.2" + } + }, + "lattice": { + "Source": "CRAN", + "Repository": "https://packagemanager.posit.co/cran/latest", + "description": { + "Package": "lattice", + "Version": "0.22-7", + "Date": "2025-03-31", + "Priority": "recommended", + "Title": "Trellis Graphics for R", + "Authors@R": "c(person(\"Deepayan\", \"Sarkar\", role = c(\"aut\", \"cre\"),\n\t email = \"deepayan.sarkar@r-project.org\",\n\t\t comment = c(ORCID = \"0000-0003-4107-1553\")),\n person(\"Felix\", \"Andrews\", role = \"ctb\"),\n\t person(\"Kevin\", \"Wright\", role = \"ctb\", comment = \"documentation\"),\n\t person(\"Neil\", \"Klepeis\", role = \"ctb\"),\n\t person(\"Johan\", \"Larsson\", role = \"ctb\", comment = \"miscellaneous improvements\"),\n person(\"Zhijian (Jason)\", \"Wen\", role = \"cph\", comment = \"filled contour code\"),\n person(\"Paul\", \"Murrell\", role = \"ctb\", email = \"paul@stat.auckland.ac.nz\"),\n\t person(\"Stefan\", \"Eng\", role = \"ctb\", comment = \"violin plot improvements\"),\n\t person(\"Achim\", \"Zeileis\", role = \"ctb\", comment = \"modern colors\"),\n person(\"Alexandre\", \"Courtiol\", role = \"ctb\", comment = \"generics for larrows, lpolygon, lrect and lsegments\")\n\t )", + "Description": "A powerful and elegant high-level data visualization\n system inspired by Trellis graphics, with an emphasis on\n multivariate data. Lattice is sufficient for typical graphics needs,\n and is also flexible enough to handle most nonstandard requirements.\n See ?Lattice for an introduction.", + "Depends": "R (>= 4.0.0)", + "Suggests": "KernSmooth, MASS, latticeExtra, colorspace", + "Imports": "grid, grDevices, graphics, stats, utils", + "Enhances": "chron, zoo", + "LazyLoad": "yes", + "LazyData": "yes", + "License": "GPL (>= 2)", + "URL": "https://lattice.r-forge.r-project.org/", + "BugReports": "https://github.com/deepayan/lattice/issues", + "NeedsCompilation": "yes", + "Packaged": "2025-04-02 04:55:57 UTC; deepayan", + "Author": "Deepayan Sarkar [aut, cre] (),\n Felix Andrews [ctb],\n Kevin Wright [ctb] (documentation),\n Neil Klepeis [ctb],\n Johan Larsson [ctb] (miscellaneous improvements),\n Zhijian (Jason) Wen [cph] (filled contour code),\n Paul Murrell [ctb],\n Stefan Eng [ctb] (violin plot improvements),\n Achim Zeileis [ctb] (modern colors),\n Alexandre Courtiol [ctb] (generics for larrows, lpolygon, lrect and\n lsegments)", + "Maintainer": "Deepayan Sarkar ", + "Repository": "RSPM", + "Date/Publication": "2025-04-02 15:40:02 UTC", + "Encoding": "UTF-8", + "Built": "R 4.4.0; x86_64-pc-linux-gnu; 2026-01-29 00:21:08 UTC; unix", + "RemoteType": "standard", + "RemotePkgRef": "lattice", + "RemoteRef": "lattice", + "RemoteRepos": "https://packagemanager.posit.co/cran/latest", + "RemotePkgPlatform": "source", + "RemoteSha": "0.22-7" + } + }, + "lazyeval": { + "Source": "CRAN", + "Repository": "https://packagemanager.posit.co/cran/latest", + "description": { + "Package": "lazyeval", + "Version": "0.2.2", + "Title": "Lazy (Non-Standard) Evaluation", + "Description": "An alternative approach to non-standard evaluation using\n formulas. Provides a full implementation of LISP style 'quasiquotation',\n making it easier to generate code with other code.", + "Authors@R": "c(\n person(\"Hadley\", \"Wickham\", ,\"hadley@rstudio.com\", c(\"aut\", \"cre\")),\n person(\"RStudio\", role = \"cph\")\n )", + "License": "GPL-3", + "LazyData": "true", + "Depends": "R (>= 3.1.0)", + "Suggests": "knitr, rmarkdown (>= 0.2.65), testthat, covr", + "VignetteBuilder": "knitr", + "RoxygenNote": "6.1.1", + "NeedsCompilation": "yes", + "Packaged": "2019-03-15 14:18:01 UTC; lionel", + "Author": "Hadley Wickham [aut, cre],\n RStudio [cph]", + "Maintainer": "Hadley Wickham ", + "Repository": "RSPM", + "Date/Publication": "2019-03-15 17:50:07 UTC", + "Encoding": "UTF-8", + "Built": "R 4.4.0; x86_64-pc-linux-gnu; 2026-01-29 00:21:05 UTC; unix", + "RemoteType": "standard", + "RemotePkgRef": "lazyeval", + "RemoteRef": "lazyeval", + "RemoteRepos": "https://packagemanager.posit.co/cran/latest", + "RemotePkgPlatform": "source", + "RemoteSha": "0.2.2" + } + }, + "lifecycle": { + "Source": "CRAN", + "Repository": "https://packagemanager.posit.co/cran/latest", + "description": { + "Package": "lifecycle", + "Title": "Manage the Life Cycle of your Package Functions", + "Version": "1.0.4", + "Authors@R": "c(\n person(\"Lionel\", \"Henry\", , \"lionel@posit.co\", role = c(\"aut\", \"cre\")),\n person(\"Hadley\", \"Wickham\", , \"hadley@posit.co\", role = \"aut\",\n comment = c(ORCID = \"0000-0003-4757-117X\")),\n person(\"Posit Software, PBC\", role = c(\"cph\", \"fnd\"))\n )", + "Description": "Manage the life cycle of your exported functions with shared\n conventions, documentation badges, and user-friendly deprecation\n warnings.", + "License": "MIT + file LICENSE", + "URL": "https://lifecycle.r-lib.org/, https://github.com/r-lib/lifecycle", + "BugReports": "https://github.com/r-lib/lifecycle/issues", + "Depends": "R (>= 3.6)", + "Imports": "cli (>= 3.4.0), glue, rlang (>= 1.1.0)", + "Suggests": "covr, crayon, knitr, lintr, rmarkdown, testthat (>= 3.0.1),\ntibble, tidyverse, tools, vctrs, withr", + "VignetteBuilder": "knitr", + "Config/Needs/website": "tidyverse/tidytemplate, usethis", + "Config/testthat/edition": "3", + "Encoding": "UTF-8", + "RoxygenNote": "7.2.1", + "NeedsCompilation": "no", + "Packaged": "2023-11-06 16:07:36 UTC; lionel", + "Author": "Lionel Henry [aut, cre],\n Hadley Wickham [aut] (),\n Posit Software, PBC [cph, fnd]", + "Maintainer": "Lionel Henry ", + "Repository": "RSPM", + "Date/Publication": "2023-11-07 10:10:10 UTC", + "Built": "R 4.4.0; ; 2026-01-29 00:24:12 UTC; unix", + "RemotePkgRef": "lifecycle@1.0.4", + "RemoteType": "standard", + "RemoteEtag": "\"8cae811dd17686ff146e207a6c4b3b42\"", + "RemotePackaged": "TRUE", + "RemoteRef": "lifecycle", + "RemoteRepos": "https://packagemanager.posit.co/cran/latest", + "RemotePkgPlatform": "source", + "RemoteSha": "1.0.4" + } + }, + "litedown": { + "Source": "CRAN", + "Repository": "https://packagemanager.posit.co/cran/latest", + "description": { + "Package": "litedown", + "Type": "Package", + "Title": "A Lightweight Version of R Markdown", + "Version": "0.7", + "Authors@R": "c(\n person(\"Yihui\", \"Xie\", role = c(\"aut\", \"cre\"), email = \"xie@yihui.name\", comment = c(ORCID = \"0000-0003-0645-5666\", URL = \"https://yihui.org\")),\n person(\"Tim\", \"Taylor\", role = \"ctb\", comment = c(ORCID = \"0000-0002-8587-7113\")),\n person()\n )", + "Description": "Render R Markdown to Markdown (without using 'knitr'), and Markdown\n to lightweight HTML or 'LaTeX' documents with the 'commonmark' package (instead\n of 'Pandoc'). Some missing Markdown features in 'commonmark' are also\n supported, such as raw HTML or 'LaTeX' blocks, 'LaTeX' math, superscripts,\n subscripts, footnotes, element attributes, and appendices,\n but not all 'Pandoc' Markdown features are (or will be) supported. With\n additional JavaScript and CSS, you can also create HTML slides and articles.\n This package can be viewed as a trimmed-down version of R Markdown and\n 'knitr'. It does not aim at rich Markdown features or a large variety of\n output formats (the primary formats are HTML and 'LaTeX'). Book and website\n projects of multiple input documents are also supported.", + "Depends": "R (>= 3.2.0)", + "Imports": "utils, commonmark (>= 1.9.5), xfun (>= 0.52)", + "Suggests": "rbibutils, rstudioapi, tinytex", + "License": "MIT + file LICENSE", + "URL": "https://github.com/yihui/litedown", + "BugReports": "https://github.com/yihui/litedown/issues", + "VignetteBuilder": "litedown", + "RoxygenNote": "7.3.2", + "Encoding": "UTF-8", + "NeedsCompilation": "no", + "Packaged": "2025-04-08 05:16:55 UTC; runner", + "Author": "Yihui Xie [aut, cre] (,\n https://yihui.org),\n Tim Taylor [ctb] ()", + "Maintainer": "Yihui Xie ", + "Repository": "RSPM", + "Date/Publication": "2025-04-08 05:40:02 UTC", + "Built": "R 4.4.0; ; 2026-01-29 00:23:20 UTC; unix", + "RemotePkgRef": "litedown@0.7", + "RemoteType": "standard", + "RemoteEtag": "\"902985d37196d7f2172a886f1a827ca9\"", + "RemotePackaged": "TRUE", + "RemoteRef": "litedown", + "RemoteRepos": "https://packagemanager.posit.co/cran/latest", + "RemotePkgPlatform": "source", + "RemoteSha": "0.7" + } + }, + "magrittr": { + "Source": "CRAN", + "Repository": "https://packagemanager.posit.co/cran/latest", + "description": { + "Type": "Package", + "Package": "magrittr", + "Title": "A Forward-Pipe Operator for R", + "Version": "2.0.3", + "Authors@R": "c(\n person(\"Stefan Milton\", \"Bache\", , \"stefan@stefanbache.dk\", role = c(\"aut\", \"cph\"),\n comment = \"Original author and creator of magrittr\"),\n person(\"Hadley\", \"Wickham\", , \"hadley@rstudio.com\", role = \"aut\"),\n person(\"Lionel\", \"Henry\", , \"lionel@rstudio.com\", role = \"cre\"),\n person(\"RStudio\", role = c(\"cph\", \"fnd\"))\n )", + "Description": "Provides a mechanism for chaining commands with a new\n forward-pipe operator, %>%. This operator will forward a value, or the\n result of an expression, into the next function call/expression.\n There is flexible support for the type of right-hand side expressions.\n For more information, see package vignette. To quote Rene Magritte,\n \"Ceci n'est pas un pipe.\"", + "License": "MIT + file LICENSE", + "URL": "https://magrittr.tidyverse.org,\nhttps://github.com/tidyverse/magrittr", + "BugReports": "https://github.com/tidyverse/magrittr/issues", + "Depends": "R (>= 3.4.0)", + "Suggests": "covr, knitr, rlang, rmarkdown, testthat", + "VignetteBuilder": "knitr", + "ByteCompile": "Yes", + "Config/Needs/website": "tidyverse/tidytemplate", + "Encoding": "UTF-8", + "RoxygenNote": "7.1.2", + "NeedsCompilation": "yes", + "Packaged": "2022-03-29 09:34:37 UTC; lionel", + "Author": "Stefan Milton Bache [aut, cph] (Original author and creator of\n magrittr),\n Hadley Wickham [aut],\n Lionel Henry [cre],\n RStudio [cph, fnd]", + "Maintainer": "Lionel Henry ", + "Repository": "RSPM", + "Date/Publication": "2022-03-30 07:30:09 UTC", + "Built": "R 4.4.0; x86_64-pc-linux-gnu; 2026-01-29 00:21:22 UTC; unix", + "RemotePkgRef": "magrittr@2.0.3", + "RemoteType": "standard", + "RemoteEtag": "\"5ca4d26a39f3bc4b994b43499ec655cb\"", + "RemotePackaged": "TRUE", + "RemoteRef": "magrittr", + "RemoteRepos": "https://packagemanager.posit.co/cran/latest", + "RemotePkgPlatform": "source", + "RemoteSha": "2.0.3" + } + }, + "markdown": { + "Source": "CRAN", + "Repository": "https://packagemanager.posit.co/cran/latest", + "description": { + "Package": "markdown", + "Type": "Package", + "Title": "Render Markdown with 'commonmark'", + "Version": "2.0", + "Authors@R": "c(\n person(\"Yihui\", \"Xie\", role = c(\"aut\", \"cre\"), email = \"xie@yihui.name\", comment = c(ORCID = \"0000-0003-0645-5666\")),\n person(\"JJ\", \"Allaire\", role = \"aut\"),\n person(\"Jeffrey\", \"Horner\", role = \"aut\"),\n person(\"Henrik\", \"Bengtsson\", role = \"ctb\"),\n person(\"Jim\", \"Hester\", role = \"ctb\"),\n person(\"Yixuan\", \"Qiu\", role = \"ctb\"),\n person(\"Kohske\", \"Takahashi\", role = \"ctb\"),\n person(\"Adam\", \"November\", role = \"ctb\"),\n person(\"Nacho\", \"Caballero\", role = \"ctb\"),\n person(\"Jeroen\", \"Ooms\", role = \"ctb\"),\n person(\"Thomas\", \"Leeper\", role = \"ctb\"),\n person(\"Joe\", \"Cheng\", role = \"ctb\"),\n person(\"Andrzej\", \"Oles\", role = \"ctb\"),\n person(given = \"Posit Software, PBC\", role = c(\"cph\", \"fnd\"))\n )", + "Description": "Render Markdown to full and lightweight HTML/LaTeX documents with\n the 'commonmark' package. This package has been superseded by 'litedown'.", + "Depends": "R (>= 2.11.1)", + "Imports": "utils, xfun, litedown (>= 0.6)", + "Suggests": "knitr, rmarkdown (>= 2.18), yaml, RCurl", + "License": "MIT + file LICENSE", + "URL": "https://github.com/rstudio/markdown", + "BugReports": "https://github.com/rstudio/markdown/issues", + "RoxygenNote": "7.3.2", + "Encoding": "UTF-8", + "NeedsCompilation": "no", + "Packaged": "2025-03-23 17:06:26 UTC; runner", + "Author": "Yihui Xie [aut, cre] (),\n JJ Allaire [aut],\n Jeffrey Horner [aut],\n Henrik Bengtsson [ctb],\n Jim Hester [ctb],\n Yixuan Qiu [ctb],\n Kohske Takahashi [ctb],\n Adam November [ctb],\n Nacho Caballero [ctb],\n Jeroen Ooms [ctb],\n Thomas Leeper [ctb],\n Joe Cheng [ctb],\n Andrzej Oles [ctb],\n Posit Software, PBC [cph, fnd]", + "Maintainer": "Yihui Xie ", + "Repository": "RSPM", + "Date/Publication": "2025-03-23 19:30:03 UTC", + "Built": "R 4.4.0; ; 2026-01-29 00:23:40 UTC; unix", + "RemoteType": "standard", + "RemotePkgRef": "markdown", + "RemoteRef": "markdown", + "RemoteRepos": "https://packagemanager.posit.co/cran/latest", + "RemotePkgPlatform": "source", + "RemoteSha": "2.0" + } + }, + "memoise": { + "Source": "CRAN", + "Repository": "https://packagemanager.posit.co/cran/latest", + "description": { + "Package": "memoise", + "Title": "'Memoisation' of Functions", + "Version": "2.0.1", + "Authors@R": "\n c(person(given = \"Hadley\",\n family = \"Wickham\",\n role = \"aut\",\n email = \"hadley@rstudio.com\"),\n person(given = \"Jim\",\n family = \"Hester\",\n role = \"aut\"),\n person(given = \"Winston\",\n family = \"Chang\",\n role = c(\"aut\", \"cre\"),\n email = \"winston@rstudio.com\"),\n person(given = \"Kirill\",\n family = \"Müller\",\n role = \"aut\",\n email = \"krlmlr+r@mailbox.org\"),\n person(given = \"Daniel\",\n family = \"Cook\",\n role = \"aut\",\n email = \"danielecook@gmail.com\"),\n person(given = \"Mark\",\n family = \"Edmondson\",\n role = \"ctb\",\n email = \"r@sunholo.com\"))", + "Description": "Cache the results of a function so that when you\n call it again with the same arguments it returns the previously computed\n value.", + "License": "MIT + file LICENSE", + "URL": "https://memoise.r-lib.org, https://github.com/r-lib/memoise", + "BugReports": "https://github.com/r-lib/memoise/issues", + "Imports": "rlang (>= 0.4.10), cachem", + "Suggests": "digest, aws.s3, covr, googleAuthR, googleCloudStorageR, httr,\ntestthat", + "Encoding": "UTF-8", + "RoxygenNote": "7.1.2", + "NeedsCompilation": "no", + "Packaged": "2021-11-24 21:24:50 UTC; jhester", + "Author": "Hadley Wickham [aut],\n Jim Hester [aut],\n Winston Chang [aut, cre],\n Kirill Müller [aut],\n Daniel Cook [aut],\n Mark Edmondson [ctb]", + "Maintainer": "Winston Chang ", + "Repository": "RSPM", + "Date/Publication": "2021-11-26 16:11:10 UTC", + "Built": "R 4.4.0; ; 2026-01-29 00:23:10 UTC; unix", + "RemotePkgRef": "memoise@2.0.1", + "RemoteType": "standard", + "RemoteEtag": "\"fc0c85417bfab5aab979641e287e52ea\"", + "RemotePackaged": "TRUE", + "RemoteRef": "memoise", + "RemoteRepos": "https://packagemanager.posit.co/cran/latest", + "RemotePkgPlatform": "source", + "RemoteSha": "2.0.1" + } + }, + "mgcv": { + "Source": "CRAN", + "Repository": "https://packagemanager.posit.co/cran/latest", + "description": { + "Package": "mgcv", + "Version": "1.9-3", + "Authors@R": "person(given = \"Simon\",\n family = \"Wood\",\n role = c(\"aut\", \"cre\"),\n email = \"simon.wood@r-project.org\")", + "Title": "Mixed GAM Computation Vehicle with Automatic Smoothness\nEstimation", + "Description": "Generalized additive (mixed) models, some of their extensions and \n other generalized ridge regression with multiple smoothing \n parameter estimation by (Restricted) Marginal Likelihood, \n Generalized Cross Validation and similar, or using iterated \n nested Laplace approximation for fully Bayesian inference. See \n Wood (2017) for an overview. \n Includes a gam() function, a wide variety of smoothers, 'JAGS' \n support and distributions beyond the exponential family. ", + "Priority": "recommended", + "Depends": "R (>= 3.6.0), nlme (>= 3.1-64)", + "Imports": "methods, stats, graphics, Matrix, splines, utils", + "Suggests": "parallel, survival, MASS", + "LazyLoad": "yes", + "ByteCompile": "yes", + "License": "GPL (>= 2)", + "NeedsCompilation": "yes", + "Packaged": "2025-04-03 13:22:13 UTC; sw283", + "Author": "Simon Wood [aut, cre]", + "Maintainer": "Simon Wood ", + "Repository": "RSPM", + "Date/Publication": "2025-04-04 05:40:02 UTC", + "Encoding": "UTF-8", + "Built": "R 4.4.0; x86_64-pc-linux-gnu; 2026-01-29 00:31:25 UTC; unix", + "RemotePkgRef": "mgcv@1.9-3", + "RemoteType": "standard", + "RemoteEtag": "\"d226566791061ffbf9e3f4117e3698ca\"", + "RemotePackaged": "TRUE", + "RemoteRef": "mgcv", + "RemoteRepos": "https://packagemanager.posit.co/cran/latest", + "RemotePkgPlatform": "source", + "RemoteSha": "1.9-3" + } + }, + "mime": { + "Source": "CRAN", + "Repository": "https://packagemanager.posit.co/cran/latest", + "description": { + "Package": "mime", + "Type": "Package", + "Title": "Map Filenames to MIME Types", + "Version": "0.13", + "Authors@R": "c(\n person(\"Yihui\", \"Xie\", role = c(\"aut\", \"cre\"), email = \"xie@yihui.name\", comment = c(ORCID = \"0000-0003-0645-5666\", URL = \"https://yihui.org\")),\n person(\"Jeffrey\", \"Horner\", role = \"ctb\"),\n person(\"Beilei\", \"Bian\", role = \"ctb\")\n )", + "Description": "Guesses the MIME type from a filename extension using the data\n derived from /etc/mime.types in UNIX-type systems.", + "Imports": "tools", + "License": "GPL", + "URL": "https://github.com/yihui/mime", + "BugReports": "https://github.com/yihui/mime/issues", + "RoxygenNote": "7.3.2", + "Encoding": "UTF-8", + "NeedsCompilation": "yes", + "Packaged": "2025-03-17 19:54:24 UTC; runner", + "Author": "Yihui Xie [aut, cre] (,\n https://yihui.org),\n Jeffrey Horner [ctb],\n Beilei Bian [ctb]", + "Maintainer": "Yihui Xie ", + "Repository": "RSPM", + "Date/Publication": "2025-03-17 20:20:02 UTC", + "Built": "R 4.4.0; x86_64-pc-linux-gnu; 2026-01-29 00:21:08 UTC; unix", + "RemoteType": "standard", + "RemotePkgRef": "mime", + "RemoteRef": "mime", + "RemoteRepos": "https://packagemanager.posit.co/cran/latest", + "RemotePkgPlatform": "source", + "RemoteSha": "0.13" + } + }, + "nlme": { + "Source": "CRAN", + "Repository": "https://packagemanager.posit.co/cran/latest", + "description": { + "Package": "nlme", + "Version": "3.1-168", + "Date": "2025-03-31", + "Priority": "recommended", + "Title": "Linear and Nonlinear Mixed Effects Models", + "Authors@R": "c(person(\"José\", \"Pinheiro\", role = \"aut\", comment = \"S version\"),\n person(\"Douglas\", \"Bates\", role = \"aut\", comment = \"up to 2007\"),\n person(\"Saikat\", \"DebRoy\", role = \"ctb\", comment = \"up to 2002\"),\n person(\"Deepayan\", \"Sarkar\", role = \"ctb\", comment = \"up to 2005\"),\n person(\"EISPACK authors\", role = \"ctb\", comment = \"src/rs.f\"),\n\t person(\"Siem\", \"Heisterkamp\", role = \"ctb\", comment = \"Author fixed sigma\"),\n person(\"Bert\", \"Van Willigen\",role = \"ctb\", comment = \"Programmer fixed sigma\"),\n person(\"Johannes\", \"Ranke\", role = \"ctb\", comment = \"varConstProp()\"),\n\t person(\"R Core Team\", email = \"R-core@R-project.org\",\n role = c(\"aut\", \"cre\"), comment = c(ROR = \"02zz1nj61\")))", + "Contact": "see 'MailingList'", + "Description": "Fit and compare Gaussian linear and nonlinear mixed-effects models.", + "Depends": "R (>= 3.6.0)", + "Imports": "graphics, stats, utils, lattice", + "Suggests": "MASS, SASmixed", + "LazyData": "yes", + "Encoding": "UTF-8", + "License": "GPL (>= 2)", + "BugReports": "https://bugs.r-project.org", + "MailingList": "R-help@r-project.org", + "URL": "https://svn.r-project.org/R-packages/trunk/nlme/", + "NeedsCompilation": "yes", + "Packaged": "2025-03-31 11:19:09 UTC; ripley", + "Author": "José Pinheiro [aut] (S version),\n Douglas Bates [aut] (up to 2007),\n Saikat DebRoy [ctb] (up to 2002),\n Deepayan Sarkar [ctb] (up to 2005),\n EISPACK authors [ctb] (src/rs.f),\n Siem Heisterkamp [ctb] (Author fixed sigma),\n Bert Van Willigen [ctb] (Programmer fixed sigma),\n Johannes Ranke [ctb] (varConstProp()),\n R Core Team [aut, cre] (02zz1nj61)", + "Maintainer": "R Core Team ", + "Repository": "RSPM", + "Date/Publication": "2025-03-31 11:21:01 UTC", + "Built": "R 4.4.0; x86_64-pc-linux-gnu; 2026-01-29 00:22:38 UTC; unix", + "RemoteType": "standard", + "RemotePkgRef": "nlme", + "RemoteRef": "nlme", + "RemoteRepos": "https://packagemanager.posit.co/cran/latest", + "RemotePkgPlatform": "source", + "RemoteSha": "3.1-168" + } + }, + "openssl": { + "Source": "CRAN", + "Repository": "https://packagemanager.posit.co/cran/latest", + "description": { + "Package": "openssl", + "Type": "Package", + "Title": "Toolkit for Encryption, Signatures and Certificates Based on\nOpenSSL", + "Version": "2.3.2", + "Authors@R": "c(person(\"Jeroen\", \"Ooms\", role = c(\"aut\", \"cre\"), email = \"jeroenooms@gmail.com\",\n comment = c(ORCID = \"0000-0002-4035-0289\")),\n person(\"Oliver\", \"Keyes\", role = \"ctb\"))", + "Description": "Bindings to OpenSSL libssl and libcrypto, plus custom SSH key parsers.\n Supports RSA, DSA and EC curves P-256, P-384, P-521, and curve25519. Cryptographic\n signatures can either be created and verified manually or via x509 certificates. \n AES can be used in cbc, ctr or gcm mode for symmetric encryption; RSA for asymmetric\n (public key) encryption or EC for Diffie Hellman. High-level envelope functions \n combine RSA and AES for encrypting arbitrary sized data. Other utilities include key\n generators, hash functions (md5, sha1, sha256, etc), base64 encoder, a secure random\n number generator, and 'bignum' math methods for manually performing crypto \n calculations on large multibyte integers.", + "License": "MIT + file LICENSE", + "URL": "https://jeroen.r-universe.dev/openssl", + "BugReports": "https://github.com/jeroen/openssl/issues", + "SystemRequirements": "OpenSSL >= 1.0.2", + "VignetteBuilder": "knitr", + "Imports": "askpass", + "Suggests": "curl, testthat (>= 2.1.0), digest, knitr, rmarkdown,\njsonlite, jose, sodium", + "RoxygenNote": "7.3.2", + "Encoding": "UTF-8", + "NeedsCompilation": "yes", + "Packaged": "2025-02-03 10:27:29 UTC; jeroen", + "Author": "Jeroen Ooms [aut, cre] (),\n Oliver Keyes [ctb]", + "Maintainer": "Jeroen Ooms ", + "Repository": "RSPM", + "Date/Publication": "2025-02-03 14:20:02 UTC", + "Built": "R 4.4.0; x86_64-pc-linux-gnu; 2026-01-29 00:23:23 UTC; unix", + "RemotePkgRef": "openssl@2.3.2", + "RemoteType": "standard", + "RemoteEtag": "\"55e85fbdcfe1ed7b660eb637e4f4379f\"", + "RemotePackaged": "TRUE", + "RemoteRef": "openssl", + "RemoteRepos": "https://packagemanager.posit.co/cran/latest", + "RemotePkgPlatform": "source", + "RemoteSha": "2.3.2" + } + }, + "patchwork": { + "Source": "CRAN", + "Repository": "https://packagemanager.posit.co/cran/latest", + "description": { + "Package": "patchwork", + "Type": "Package", + "Title": "The Composer of Plots", + "Version": "1.3.0", + "Authors@R": "\n person(given = \"Thomas Lin\",\n family = \"Pedersen\",\n role = c(\"cre\", \"aut\"),\n email = \"thomasp85@gmail.com\",\n comment = c(ORCID = \"0000-0002-5147-4711\"))", + "Maintainer": "Thomas Lin Pedersen ", + "Description": "The 'ggplot2' package provides a strong API for sequentially \n building up a plot, but does not concern itself with composition of multiple\n plots. 'patchwork' is a package that expands the API to allow for \n arbitrarily complex composition of plots by, among others, providing \n mathematical operators for combining multiple plots. Other packages that try \n to address this need (but with a different approach) are 'gridExtra' and \n 'cowplot'.", + "License": "MIT + file LICENSE", + "Encoding": "UTF-8", + "Imports": "ggplot2 (>= 3.0.0), gtable, grid, stats, grDevices, utils,\ngraphics, rlang (>= 1.0.0), cli, farver", + "RoxygenNote": "7.3.2", + "URL": "https://patchwork.data-imaginist.com,\nhttps://github.com/thomasp85/patchwork", + "BugReports": "https://github.com/thomasp85/patchwork/issues", + "Suggests": "knitr, rmarkdown, gridGraphics, gridExtra, ragg, testthat (>=\n2.1.0), vdiffr, covr, png, gt (>= 0.11.0)", + "VignetteBuilder": "knitr", + "Config/Needs/website": "gifski", + "NeedsCompilation": "no", + "Packaged": "2024-09-16 08:14:08 UTC; thomas", + "Author": "Thomas Lin Pedersen [cre, aut]\n ()", + "Repository": "RSPM", + "Date/Publication": "2024-09-16 09:30:02 UTC", + "Built": "R 4.4.0; ; 2026-01-29 00:33:26 UTC; unix", + "RemotePkgRef": "patchwork@1.3.0", + "RemoteType": "standard", + "RemoteEtag": "\"3838aa5df0ed1473a1952468db5e2be5\"", + "RemotePackaged": "TRUE", + "RemoteRef": "patchwork", + "RemoteRepos": "https://packagemanager.posit.co/cran/latest", + "RemotePkgPlatform": "source", + "RemoteSha": "1.3.0" + } + }, + "pillar": { + "Source": "CRAN", + "Repository": "https://packagemanager.posit.co/cran/latest", + "description": { + "Package": "pillar", + "Title": "Coloured Formatting for Columns", + "Version": "1.10.2", + "Authors@R": "\n c(person(given = \"Kirill\",\n family = \"M\\u00fcller\",\n role = c(\"aut\", \"cre\"),\n email = \"kirill@cynkra.com\",\n comment = c(ORCID = \"0000-0002-1416-3412\")),\n person(given = \"Hadley\",\n family = \"Wickham\",\n role = \"aut\"),\n person(given = \"RStudio\",\n role = \"cph\"))", + "Description": "Provides 'pillar' and 'colonnade' generics designed\n for formatting columns of data using the full range of colours\n provided by modern terminals.", + "License": "MIT + file LICENSE", + "URL": "https://pillar.r-lib.org/, https://github.com/r-lib/pillar", + "BugReports": "https://github.com/r-lib/pillar/issues", + "Imports": "cli (>= 2.3.0), glue, lifecycle, rlang (>= 1.0.2), utf8 (>=\n1.1.0), utils, vctrs (>= 0.5.0)", + "Suggests": "bit64, DBI, debugme, DiagrammeR, dplyr, formattable, ggplot2,\nknitr, lubridate, nanotime, nycflights13, palmerpenguins,\nrmarkdown, scales, stringi, survival, testthat (>= 3.1.1),\ntibble, units (>= 0.7.2), vdiffr, withr", + "VignetteBuilder": "knitr", + "Encoding": "UTF-8", + "RoxygenNote": "7.3.2.9000", + "Config/testthat/edition": "3", + "Config/testthat/parallel": "true", + "Config/testthat/start-first": "format_multi_fuzz, format_multi_fuzz_2,\nformat_multi, ctl_colonnade, ctl_colonnade_1, ctl_colonnade_2", + "Config/autostyle/scope": "line_breaks", + "Config/autostyle/strict": "true", + "Config/gha/extra-packages": "units=?ignore-before-r=4.3.0", + "Config/Needs/website": "tidyverse/tidytemplate", + "NeedsCompilation": "no", + "Packaged": "2025-04-05 12:40:18 UTC; kirill", + "Author": "Kirill Müller [aut, cre] (),\n Hadley Wickham [aut],\n RStudio [cph]", + "Maintainer": "Kirill Müller ", + "Repository": "RSPM", + "Date/Publication": "2025-04-05 13:40:02 UTC", + "Built": "R 4.4.0; ; 2026-01-29 00:25:45 UTC; unix", + "RemotePkgRef": "pillar@1.10.2", + "RemoteType": "standard", + "RemoteEtag": "\"79bbe39ee1cc625b0958fc5690190dee\"", + "RemotePackaged": "TRUE", + "RemoteRef": "pillar", + "RemoteRepos": "https://packagemanager.posit.co/cran/latest", + "RemotePkgPlatform": "source", + "RemoteSha": "1.10.2" + } + }, + "pkgbuild": { + "Source": "CRAN", + "Repository": "https://packagemanager.posit.co/cran/latest", + "description": { + "Package": "pkgbuild", + "Title": "Find Tools Needed to Build R Packages", + "Version": "1.4.7", + "Authors@R": "c(\n person(\"Hadley\", \"Wickham\", role = \"aut\"),\n person(\"Jim\", \"Hester\", role = \"aut\"),\n person(\"Gábor\", \"Csárdi\", , \"csardi.gabor@gmail.com\", role = c(\"aut\", \"cre\")),\n person(\"Posit Software, PBC\", role = c(\"cph\", \"fnd\"))\n )", + "Description": "Provides functions used to build R packages. Locates\n compilers needed to build R packages on various platforms and ensures\n the PATH is configured appropriately so R can use them.", + "License": "MIT + file LICENSE", + "URL": "https://github.com/r-lib/pkgbuild, https://pkgbuild.r-lib.org", + "BugReports": "https://github.com/r-lib/pkgbuild/issues", + "Depends": "R (>= 3.5)", + "Imports": "callr (>= 3.2.0), cli (>= 3.4.0), desc, processx, R6", + "Suggests": "covr, cpp11, knitr, Rcpp, rmarkdown, testthat (>= 3.2.0),\nwithr (>= 2.3.0)", + "Config/Needs/website": "tidyverse/tidytemplate", + "Config/testthat/edition": "3", + "Encoding": "UTF-8", + "RoxygenNote": "7.3.2", + "NeedsCompilation": "no", + "Packaged": "2025-03-24 12:21:28 UTC; gaborcsardi", + "Author": "Hadley Wickham [aut],\n Jim Hester [aut],\n Gábor Csárdi [aut, cre],\n Posit Software, PBC [cph, fnd]", + "Maintainer": "Gábor Csárdi ", + "Repository": "RSPM", + "Date/Publication": "2025-03-24 14:40:02 UTC", + "Built": "R 4.4.0; ; 2026-01-29 00:24:16 UTC; unix", + "RemotePkgRef": "pkgbuild@1.4.7", + "RemoteType": "standard", + "RemoteEtag": "\"0612680656b4e26be772857b62bc2643\"", + "RemotePackaged": "TRUE", + "RemoteRef": "pkgbuild", + "RemoteRepos": "https://packagemanager.posit.co/cran/latest", + "RemotePkgPlatform": "source", + "RemoteSha": "1.4.7" + } + }, + "pkgconfig": { + "Source": "CRAN", + "Repository": "https://packagemanager.posit.co/cran/latest", + "description": { + "Package": "pkgconfig", + "Title": "Private Configuration for 'R' Packages", + "Version": "2.0.3", + "Author": "Gábor Csárdi", + "Maintainer": "Gábor Csárdi ", + "Description": "Set configuration options on a per-package basis.\n Options set by a given package only apply to that package,\n other packages are unaffected.", + "License": "MIT + file LICENSE", + "LazyData": "true", + "Imports": "utils", + "Suggests": "covr, testthat, disposables (>= 1.0.3)", + "URL": "https://github.com/r-lib/pkgconfig#readme", + "BugReports": "https://github.com/r-lib/pkgconfig/issues", + "Encoding": "UTF-8", + "NeedsCompilation": "no", + "Packaged": "2019-09-22 08:42:40 UTC; gaborcsardi", + "Repository": "RSPM", + "Date/Publication": "2019-09-22 09:20:02 UTC", + "Built": "R 4.4.0; ; 2026-01-29 00:21:14 UTC; unix", + "RemoteType": "standard", + "RemotePkgRef": "pkgconfig", + "RemoteRef": "pkgconfig", + "RemoteRepos": "https://packagemanager.posit.co/cran/latest", + "RemotePkgPlatform": "source", + "RemoteSha": "2.0.3" + } + }, + "pkgload": { + "Source": "CRAN", + "Repository": "https://packagemanager.posit.co/cran/latest", + "description": { + "Package": "pkgload", + "Title": "Simulate Package Installation and Attach", + "Version": "1.4.0", + "Authors@R": "c(\n person(\"Hadley\", \"Wickham\", role = \"aut\"),\n person(\"Winston\", \"Chang\", role = \"aut\"),\n person(\"Jim\", \"Hester\", role = \"aut\"),\n person(\"Lionel\", \"Henry\", , \"lionel@posit.co\", role = c(\"aut\", \"cre\")),\n person(\"Posit Software, PBC\", role = c(\"cph\", \"fnd\")),\n person(\"R Core team\", role = \"ctb\",\n comment = \"Some namespace and vignette code extracted from base R\")\n )", + "Description": "Simulates the process of installing a package and then\n attaching it. This is a key part of the 'devtools' package as it\n allows you to rapidly iterate while developing a package.", + "License": "GPL-3", + "URL": "https://github.com/r-lib/pkgload, https://pkgload.r-lib.org", + "BugReports": "https://github.com/r-lib/pkgload/issues", + "Depends": "R (>= 3.4.0)", + "Imports": "cli (>= 3.3.0), desc, fs, glue, lifecycle, methods, pkgbuild,\nprocessx, rlang (>= 1.1.1), rprojroot, utils, withr (>= 2.4.3)", + "Suggests": "bitops, jsonlite, mathjaxr, pak, Rcpp, remotes, rstudioapi,\ntestthat (>= 3.2.1.1), usethis", + "Config/Needs/website": "tidyverse/tidytemplate, ggplot2", + "Config/testthat/edition": "3", + "Config/testthat/parallel": "TRUE", + "Config/testthat/start-first": "dll", + "Encoding": "UTF-8", + "RoxygenNote": "7.3.1", + "NeedsCompilation": "no", + "Packaged": "2024-06-28 10:36:56 UTC; lionel", + "Author": "Hadley Wickham [aut],\n Winston Chang [aut],\n Jim Hester [aut],\n Lionel Henry [aut, cre],\n Posit Software, PBC [cph, fnd],\n R Core team [ctb] (Some namespace and vignette code extracted from base\n R)", + "Maintainer": "Lionel Henry ", + "Repository": "RSPM", + "Date/Publication": "2024-06-28 11:30:02 UTC", + "Built": "R 4.4.0; ; 2026-01-29 00:24:35 UTC; unix", + "RemotePkgRef": "pkgload@1.4.0", + "RemoteType": "standard", + "RemoteEtag": "\"8df0bb4bafced3331b6eae245c8ede2c\"", + "RemotePackaged": "TRUE", + "RemoteRef": "pkgload", + "RemoteRepos": "https://packagemanager.posit.co/cran/latest", + "RemotePkgPlatform": "source", + "RemoteSha": "1.4.0" + } + }, + "plotly": { + "Source": "CRAN", + "Repository": "https://packagemanager.posit.co/cran/latest", + "description": { + "Package": "plotly", + "Title": "Create Interactive Web Graphics via 'plotly.js'", + "Version": "4.10.4", + "Authors@R": "c(person(\"Carson\", \"Sievert\", role = c(\"aut\", \"cre\"),\n email = \"cpsievert1@gmail.com\", comment = c(ORCID = \"0000-0002-4958-2844\")),\n person(\"Chris\", \"Parmer\", role = \"aut\",\n email = \"chris@plot.ly\"),\n person(\"Toby\", \"Hocking\", role = \"aut\",\n email = \"tdhock5@gmail.com\"),\n person(\"Scott\", \"Chamberlain\", role = \"aut\",\n email = \"myrmecocystus@gmail.com\"),\n person(\"Karthik\", \"Ram\", role = \"aut\",\n email = \"karthik.ram@gmail.com\"),\n person(\"Marianne\", \"Corvellec\", role = \"aut\",\n email = \"marianne.corvellec@igdore.org\", comment = c(ORCID = \"0000-0002-1994-3581\")),\n person(\"Pedro\", \"Despouy\", role = \"aut\",\n email = \"pedro@plot.ly\"),\n person(\"Salim\", \"Brüggemann\", role = \"ctb\",\n email = \"salim-b@pm.me\", comment = c(ORCID = \"0000-0002-5329-5987\")),\n person(\"Plotly Technologies Inc.\", role = \"cph\"))", + "License": "MIT + file LICENSE", + "Description": "Create interactive web graphics from 'ggplot2' graphs and/or a custom interface to the (MIT-licensed) JavaScript library 'plotly.js' inspired by the grammar of graphics.", + "URL": "https://plotly-r.com, https://github.com/plotly/plotly.R,\nhttps://plotly.com/r/", + "BugReports": "https://github.com/plotly/plotly.R/issues", + "Depends": "R (>= 3.2.0), ggplot2 (>= 3.0.0)", + "Imports": "tools, scales, httr (>= 1.3.0), jsonlite (>= 1.6), magrittr,\ndigest, viridisLite, base64enc, htmltools (>= 0.3.6),\nhtmlwidgets (>= 1.5.2.9001), tidyr (>= 1.0.0), RColorBrewer,\ndplyr, vctrs, tibble, lazyeval (>= 0.2.0), rlang (>= 0.4.10),\ncrosstalk, purrr, data.table, promises", + "Suggests": "MASS, maps, hexbin, ggthemes, GGally, ggalluvial, testthat,\nknitr, shiny (>= 1.1.0), shinytest (>= 1.3.0), curl, rmarkdown,\nCairo, broom, webshot, listviewer, dendextend, sf, png,\nIRdisplay, processx, plotlyGeoAssets, forcats, withr,\npalmerpenguins, rversions, reticulate, rsvg", + "LazyData": "true", + "RoxygenNote": "7.2.3", + "Encoding": "UTF-8", + "Config/Needs/check": "tidyverse/ggplot2, rcmdcheck, devtools, reshape2", + "NeedsCompilation": "no", + "Packaged": "2024-01-13 20:51:33 UTC; cpsievert", + "Author": "Carson Sievert [aut, cre] (),\n Chris Parmer [aut],\n Toby Hocking [aut],\n Scott Chamberlain [aut],\n Karthik Ram [aut],\n Marianne Corvellec [aut] (),\n Pedro Despouy [aut],\n Salim Brüggemann [ctb] (),\n Plotly Technologies Inc. [cph]", + "Maintainer": "Carson Sievert ", + "Repository": "RSPM", + "Date/Publication": "2024-01-13 22:40:02 UTC", + "Built": "R 4.4.0; ; 2026-01-29 00:33:28 UTC; unix", + "RemotePkgRef": "plotly@4.10.4", + "RemoteType": "standard", + "RemoteEtag": "\"839a95630a98311df1ce0f0dbcb8db14\"", + "RemotePackaged": "TRUE", + "RemoteRef": "plotly", + "RemoteRepos": "https://packagemanager.posit.co/cran/latest", + "RemotePkgPlatform": "source", + "RemoteSha": "4.10.4" + } + }, + "plyr": { + "Source": "CRAN", + "Repository": "https://packagemanager.posit.co/cran/latest", + "description": { + "Package": "plyr", + "Title": "Tools for Splitting, Applying and Combining Data", + "Version": "1.8.9", + "Authors@R": "\n person(\"Hadley\", \"Wickham\", , \"hadley@rstudio.com\", role = c(\"aut\", \"cre\"))", + "Description": "A set of tools that solves a common set of problems: you need\n to break a big problem down into manageable pieces, operate on each\n piece and then put all the pieces back together. For example, you\n might want to fit a model to each spatial location or time point in\n your study, summarise data by panels or collapse high-dimensional\n arrays to simpler summary statistics. The development of 'plyr' has\n been generously supported by 'Becton Dickinson'.", + "License": "MIT + file LICENSE", + "URL": "http://had.co.nz/plyr, https://github.com/hadley/plyr", + "BugReports": "https://github.com/hadley/plyr/issues", + "Depends": "R (>= 3.1.0)", + "Imports": "Rcpp (>= 0.11.0)", + "Suggests": "abind, covr, doParallel, foreach, iterators, itertools,\ntcltk, testthat", + "LinkingTo": "Rcpp", + "Encoding": "UTF-8", + "LazyData": "true", + "RoxygenNote": "7.2.3", + "NeedsCompilation": "yes", + "Packaged": "2023-09-27 13:58:04 UTC; hadleywickham", + "Author": "Hadley Wickham [aut, cre]", + "Maintainer": "Hadley Wickham ", + "Repository": "RSPM", + "Date/Publication": "2023-10-02 06:50:08 UTC", + "Built": "R 4.4.0; x86_64-pc-linux-gnu; 2026-01-29 00:23:35 UTC; unix", + "RemoteType": "standard", + "RemotePkgRef": "plyr", + "RemoteRef": "plyr", + "RemoteRepos": "https://packagemanager.posit.co/cran/latest", + "RemotePkgPlatform": "source", + "RemoteSha": "1.8.9" + } + }, + "prettyunits": { + "Source": "CRAN", + "Repository": "https://packagemanager.posit.co/cran/latest", + "description": { + "Package": "prettyunits", + "Title": "Pretty, Human Readable Formatting of Quantities", + "Version": "1.2.0", + "Authors@R": "c(\n person(\"Gabor\", \"Csardi\", email=\"csardi.gabor@gmail.com\", role=c(\"aut\", \"cre\")),\n person(\"Bill\", \"Denney\", email=\"wdenney@humanpredictions.com\", role=c(\"ctb\"), comment=c(ORCID=\"0000-0002-5759-428X\")),\n person(\"Christophe\", \"Regouby\", email=\"christophe.regouby@free.fr\", role=c(\"ctb\"))\n )", + "Description": "Pretty, human readable formatting of quantities.\n Time intervals: '1337000' -> '15d 11h 23m 20s'.\n Vague time intervals: '2674000' -> 'about a month ago'.\n Bytes: '1337' -> '1.34 kB'.\n Rounding: '99' with 3 significant digits -> '99.0'\n p-values: '0.00001' -> '<0.0001'.\n Colors: '#FF0000' -> 'red'.\n Quantities: '1239437' -> '1.24 M'.", + "License": "MIT + file LICENSE", + "URL": "https://github.com/r-lib/prettyunits", + "BugReports": "https://github.com/r-lib/prettyunits/issues", + "Depends": "R(>= 2.10)", + "Suggests": "codetools, covr, testthat", + "RoxygenNote": "7.2.3", + "Encoding": "UTF-8", + "NeedsCompilation": "no", + "Packaged": "2023-09-24 10:53:19 UTC; gaborcsardi", + "Author": "Gabor Csardi [aut, cre],\n Bill Denney [ctb] (),\n Christophe Regouby [ctb]", + "Maintainer": "Gabor Csardi ", + "Repository": "RSPM", + "Date/Publication": "2023-09-24 21:10:02 UTC", + "Built": "R 4.4.0; ; 2026-01-29 00:21:24 UTC; unix", + "RemoteType": "standard", + "RemotePkgRef": "prettyunits", + "RemoteRef": "prettyunits", + "RemoteRepos": "https://packagemanager.posit.co/cran/latest", + "RemotePkgPlatform": "source", + "RemoteSha": "1.2.0" + } + }, + "processx": { + "Source": "CRAN", + "Repository": "https://packagemanager.posit.co/cran/latest", + "description": { + "Package": "processx", + "Title": "Execute and Control System Processes", + "Version": "3.8.6", + "Authors@R": "c(\n person(\"Gábor\", \"Csárdi\", , \"csardi.gabor@gmail.com\", role = c(\"aut\", \"cre\", \"cph\"),\n comment = c(ORCID = \"0000-0001-7098-9676\")),\n person(\"Winston\", \"Chang\", role = \"aut\"),\n person(\"Posit Software, PBC\", role = c(\"cph\", \"fnd\")),\n person(\"Ascent Digital Services\", role = c(\"cph\", \"fnd\"))\n )", + "Description": "Tools to run system processes in the background. It can\n check if a background process is running; wait on a background process\n to finish; get the exit status of finished processes; kill background\n processes. It can read the standard output and error of the processes,\n using non-blocking connections. 'processx' can poll a process for\n standard output or error, with a timeout. It can also poll several\n processes at once.", + "License": "MIT + file LICENSE", + "URL": "https://processx.r-lib.org, https://github.com/r-lib/processx", + "BugReports": "https://github.com/r-lib/processx/issues", + "Depends": "R (>= 3.4.0)", + "Imports": "ps (>= 1.2.0), R6, utils", + "Suggests": "callr (>= 3.7.3), cli (>= 3.3.0), codetools, covr, curl,\ndebugme, parallel, rlang (>= 1.0.2), testthat (>= 3.0.0),\nwebfakes, withr", + "Config/Needs/website": "tidyverse/tidytemplate", + "Config/testthat/edition": "3", + "Encoding": "UTF-8", + "RoxygenNote": "7.3.1.9000", + "NeedsCompilation": "yes", + "Packaged": "2025-02-19 21:20:47 UTC; gaborcsardi", + "Author": "Gábor Csárdi [aut, cre, cph] (),\n Winston Chang [aut],\n Posit Software, PBC [cph, fnd],\n Ascent Digital Services [cph, fnd]", + "Maintainer": "Gábor Csárdi ", + "Repository": "RSPM", + "Date/Publication": "2025-02-21 17:00:01 UTC", + "Built": "R 4.4.0; x86_64-pc-linux-gnu; 2026-01-29 00:22:56 UTC; unix", + "RemotePkgRef": "processx@3.8.6", + "RemoteType": "standard", + "RemoteEtag": "\"6b73754a0212316e2ebed11ccf84b910\"", + "RemotePackaged": "TRUE", + "RemoteRef": "processx", + "RemoteRepos": "https://packagemanager.posit.co/cran/latest", + "RemotePkgPlatform": "source", + "RemoteSha": "3.8.6" + } + }, + "progress": { + "Source": "CRAN", + "Repository": "https://packagemanager.posit.co/cran/latest", + "description": { + "Package": "progress", + "Title": "Terminal Progress Bars", + "Version": "1.2.3", + "Authors@R": "c(\n person(\"Gábor\", \"Csárdi\", , \"csardi.gabor@gmail.com\", role = c(\"aut\", \"cre\")),\n person(\"Rich\", \"FitzJohn\", role = \"aut\"),\n person(\"Posit Software, PBC\", role = c(\"cph\", \"fnd\"))\n )", + "Description": "Configurable Progress bars, they may include percentage,\n elapsed time, and/or the estimated completion time. They work in\n terminals, in 'Emacs' 'ESS', 'RStudio', 'Windows' 'Rgui' and the\n 'macOS' 'R.app'. The package also provides a 'C++' 'API', that works\n with or without 'Rcpp'.", + "License": "MIT + file LICENSE", + "URL": "https://github.com/r-lib/progress#readme,\nhttp://r-lib.github.io/progress/", + "BugReports": "https://github.com/r-lib/progress/issues", + "Depends": "R (>= 3.6)", + "Imports": "crayon, hms, prettyunits, R6", + "Suggests": "Rcpp, testthat (>= 3.0.0), withr", + "Config/Needs/website": "tidyverse/tidytemplate", + "Config/testthat/edition": "3", + "Encoding": "UTF-8", + "RoxygenNote": "7.2.3", + "NeedsCompilation": "no", + "Packaged": "2023-12-05 09:33:10 UTC; gaborcsardi", + "Author": "Gábor Csárdi [aut, cre],\n Rich FitzJohn [aut],\n Posit Software, PBC [cph, fnd]", + "Maintainer": "Gábor Csárdi ", + "Repository": "RSPM", + "Date/Publication": "2023-12-06 10:30:02 UTC", + "Built": "R 4.4.0; ; 2026-01-29 00:25:52 UTC; unix", + "RemotePkgRef": "progress@1.2.3", + "RemoteType": "standard", + "RemoteEtag": "\"08f8cff2613471983c1276fd5ebe909b\"", + "RemotePackaged": "TRUE", + "RemoteRef": "progress", + "RemoteRepos": "https://packagemanager.posit.co/cran/latest", + "RemotePkgPlatform": "source", + "RemoteSha": "1.2.3" + } + }, + "promises": { + "Source": "CRAN", + "Repository": "https://packagemanager.posit.co/cran/latest", + "description": { + "Type": "Package", + "Package": "promises", + "Title": "Abstractions for Promise-Based Asynchronous Programming", + "Version": "1.3.2", + "Authors@R": "c(\n person(\"Joe\", \"Cheng\", , \"joe@posit.co\", role = c(\"aut\", \"cre\")),\n person(\"Posit Software, PBC\", role = c(\"cph\", \"fnd\"))\n )", + "Description": "Provides fundamental abstractions for doing asynchronous\n programming in R using promises. Asynchronous programming is useful\n for allowing a single R process to orchestrate multiple tasks in the\n background while also attending to something else. Semantics are\n similar to 'JavaScript' promises, but with a syntax that is idiomatic\n R.", + "License": "MIT + file LICENSE", + "URL": "https://rstudio.github.io/promises/,\nhttps://github.com/rstudio/promises", + "BugReports": "https://github.com/rstudio/promises/issues", + "Imports": "fastmap (>= 1.1.0), later, magrittr (>= 1.5), R6, Rcpp, rlang,\nstats", + "Suggests": "future (>= 1.21.0), knitr, purrr, rmarkdown, spelling,\ntestthat, vembedr", + "LinkingTo": "later, Rcpp", + "VignetteBuilder": "knitr", + "Config/Needs/website": "rsconnect", + "Encoding": "UTF-8", + "Language": "en-US", + "RoxygenNote": "7.3.2", + "NeedsCompilation": "yes", + "Packaged": "2024-11-27 23:38:47 UTC; jcheng", + "Author": "Joe Cheng [aut, cre],\n Posit Software, PBC [cph, fnd]", + "Maintainer": "Joe Cheng ", + "Repository": "RSPM", + "Date/Publication": "2024-11-28 00:40:02 UTC", + "Built": "R 4.4.0; x86_64-pc-linux-gnu; 2026-01-29 00:24:24 UTC; unix", + "RemotePkgRef": "promises@1.3.2", + "RemoteType": "standard", + "RemoteEtag": "\"f68512b4572bcbf39756cb0b23add3b1\"", + "RemotePackaged": "TRUE", + "RemoteRef": "promises", + "RemoteRepos": "https://packagemanager.posit.co/cran/latest", + "RemotePkgPlatform": "source", + "RemoteSha": "1.3.2" + } + }, + "ps": { + "Source": "CRAN", + "Repository": "https://packagemanager.posit.co/cran/latest", + "description": { + "Package": "ps", + "Title": "List, Query, Manipulate System Processes", + "Version": "1.9.1", + "Authors@R": "c(\n person(\"Jay\", \"Loden\", role = \"aut\"),\n person(\"Dave\", \"Daeschler\", role = \"aut\"),\n person(\"Giampaolo\", \"Rodola'\", role = \"aut\"),\n person(\"Gábor\", \"Csárdi\", , \"csardi.gabor@gmail.com\", role = c(\"aut\", \"cre\")),\n person(\"Posit Software, PBC\", role = c(\"cph\", \"fnd\"))\n )", + "Description": "List, query and manipulate all system processes, on\n 'Windows', 'Linux' and 'macOS'.", + "License": "MIT + file LICENSE", + "URL": "https://github.com/r-lib/ps, https://ps.r-lib.org/", + "BugReports": "https://github.com/r-lib/ps/issues", + "Depends": "R (>= 3.4)", + "Imports": "utils", + "Suggests": "callr, covr, curl, pillar, pingr, processx (>= 3.1.0), R6,\nrlang, testthat (>= 3.0.0), webfakes, withr", + "Biarch": "true", + "Config/Needs/website": "tidyverse/tidytemplate", + "Config/testthat/edition": "3", + "Encoding": "UTF-8", + "RoxygenNote": "7.3.2", + "NeedsCompilation": "yes", + "Packaged": "2025-04-12 09:23:06 UTC; gaborcsardi", + "Author": "Jay Loden [aut],\n Dave Daeschler [aut],\n Giampaolo Rodola' [aut],\n Gábor Csárdi [aut, cre],\n Posit Software, PBC [cph, fnd]", + "Maintainer": "Gábor Csárdi ", + "Repository": "RSPM", + "Date/Publication": "2025-04-12 09:50:01 UTC", + "Built": "R 4.4.0; x86_64-pc-linux-gnu; 2026-01-29 00:21:28 UTC; unix", + "RemoteType": "standard", + "RemotePkgRef": "ps", + "RemoteRef": "ps", + "RemoteRepos": "https://packagemanager.posit.co/cran/latest", + "RemotePkgPlatform": "source", + "RemoteSha": "1.9.1" + } + }, + "purrr": { + "Source": "CRAN", + "Repository": "https://packagemanager.posit.co/cran/latest", + "description": { + "Package": "purrr", + "Title": "Functional Programming Tools", + "Version": "1.0.4", + "Authors@R": "c(\n person(\"Hadley\", \"Wickham\", , \"hadley@posit.co\", role = c(\"aut\", \"cre\"),\n comment = c(ORCID = \"0000-0003-4757-117X\")),\n person(\"Lionel\", \"Henry\", , \"lionel@posit.co\", role = \"aut\"),\n person(\"Posit Software, PBC\", role = c(\"cph\", \"fnd\"),\n comment = c(ROR = \"03wc8by49\"))\n )", + "Description": "A complete and consistent functional programming toolkit for\n R.", + "License": "MIT + file LICENSE", + "URL": "https://purrr.tidyverse.org/, https://github.com/tidyverse/purrr", + "BugReports": "https://github.com/tidyverse/purrr/issues", + "Depends": "R (>= 4.0)", + "Imports": "cli (>= 3.6.1), lifecycle (>= 1.0.3), magrittr (>= 1.5.0),\nrlang (>= 1.1.1), vctrs (>= 0.6.3)", + "Suggests": "covr, dplyr (>= 0.7.8), httr, knitr, lubridate, rmarkdown,\ntestthat (>= 3.0.0), tibble, tidyselect", + "LinkingTo": "cli", + "VignetteBuilder": "knitr", + "Biarch": "true", + "Config/build/compilation-database": "true", + "Config/Needs/website": "tidyverse/tidytemplate, tidyr", + "Config/testthat/edition": "3", + "Config/testthat/parallel": "TRUE", + "Encoding": "UTF-8", + "RoxygenNote": "7.3.2", + "NeedsCompilation": "yes", + "Packaged": "2025-01-29 21:33:56 UTC; hadleywickham", + "Author": "Hadley Wickham [aut, cre] (),\n Lionel Henry [aut],\n Posit Software, PBC [cph, fnd] (03wc8by49)", + "Maintainer": "Hadley Wickham ", + "Repository": "RSPM", + "Date/Publication": "2025-02-05 18:00:01 UTC", + "Built": "R 4.4.0; x86_64-pc-linux-gnu; 2026-01-29 00:25:51 UTC; unix", + "RemotePkgRef": "purrr@1.0.4", + "RemoteType": "standard", + "RemoteEtag": "\"c50492522592ec547fdc61cea720432d\"", + "RemotePackaged": "TRUE", + "RemoteRef": "purrr", + "RemoteRepos": "https://packagemanager.posit.co/cran/latest", + "RemotePkgPlatform": "source", + "RemoteSha": "1.0.4" + } + }, + "rappdirs": { + "Source": "CRAN", + "Repository": "https://packagemanager.posit.co/cran/latest", + "description": { + "Type": "Package", + "Package": "rappdirs", + "Title": "Application Directories: Determine Where to Save Data, Caches,\nand Logs", + "Version": "0.3.3", + "Authors@R": "\n c(person(given = \"Hadley\",\n family = \"Wickham\",\n role = c(\"trl\", \"cre\", \"cph\"),\n email = \"hadley@rstudio.com\"),\n person(given = \"RStudio\",\n role = \"cph\"),\n person(given = \"Sridhar\",\n family = \"Ratnakumar\",\n role = \"aut\"),\n person(given = \"Trent\",\n family = \"Mick\",\n role = \"aut\"),\n person(given = \"ActiveState\",\n role = \"cph\",\n comment = \"R/appdir.r, R/cache.r, R/data.r, R/log.r translated from appdirs\"),\n person(given = \"Eddy\",\n family = \"Petrisor\",\n role = \"ctb\"),\n person(given = \"Trevor\",\n family = \"Davis\",\n role = c(\"trl\", \"aut\")),\n person(given = \"Gabor\",\n family = \"Csardi\",\n role = \"ctb\"),\n person(given = \"Gregory\",\n family = \"Jefferis\",\n role = \"ctb\"))", + "Description": "An easy way to determine which directories on the\n users computer you should use to save data, caches and logs. A port of\n Python's 'Appdirs' () to\n R.", + "License": "MIT + file LICENSE", + "URL": "https://rappdirs.r-lib.org, https://github.com/r-lib/rappdirs", + "BugReports": "https://github.com/r-lib/rappdirs/issues", + "Depends": "R (>= 3.2)", + "Suggests": "roxygen2, testthat (>= 3.0.0), covr, withr", + "Copyright": "Original python appdirs module copyright (c) 2010\nActiveState Software Inc. R port copyright Hadley Wickham,\nRStudio. See file LICENSE for details.", + "Encoding": "UTF-8", + "RoxygenNote": "7.1.1", + "Config/testthat/edition": "3", + "NeedsCompilation": "yes", + "Packaged": "2021-01-28 22:29:57 UTC; hadley", + "Author": "Hadley Wickham [trl, cre, cph],\n RStudio [cph],\n Sridhar Ratnakumar [aut],\n Trent Mick [aut],\n ActiveState [cph] (R/appdir.r, R/cache.r, R/data.r, R/log.r translated\n from appdirs),\n Eddy Petrisor [ctb],\n Trevor Davis [trl, aut],\n Gabor Csardi [ctb],\n Gregory Jefferis [ctb]", + "Maintainer": "Hadley Wickham ", + "Repository": "RSPM", + "Date/Publication": "2021-01-31 05:40:02 UTC", + "Built": "R 4.4.0; x86_64-pc-linux-gnu; 2026-01-29 00:21:24 UTC; unix", + "RemotePkgRef": "rappdirs@0.3.3", + "RemoteType": "standard", + "RemoteEtag": "\"050416acfbc9dc7a37667b4d51be6fe3\"", + "RemotePackaged": "TRUE", + "RemoteRef": "rappdirs", + "RemoteRepos": "https://packagemanager.posit.co/cran/latest", + "RemotePkgPlatform": "source", + "RemoteSha": "0.3.3" + } + }, + "reactR": { + "Source": "CRAN", + "Repository": "https://packagemanager.posit.co/cran/latest", + "description": { + "Package": "reactR", + "Type": "Package", + "Title": "React Helpers", + "Version": "0.6.1", + "Date": "2024-09-14", + "Authors@R": "c(\n person(\n \"Facebook\", \"Inc\"\n , role = c(\"aut\", \"cph\")\n , comment = \"React library in lib, https://reactjs.org/; see AUTHORS for full list of contributors\"\n ),\n person(\n \"Michel\",\"Weststrate\",\n , role = c(\"aut\", \"cph\")\n , comment = \"mobx library in lib, https://github.com/mobxjs\"\n ),\n person(\n \"Kent\", \"Russell\"\n , role = c(\"aut\", \"cre\")\n , comment = \"R interface\"\n , email = \"kent.russell@timelyportfolio.com\"\n ),\n person(\n \"Alan\", \"Dipert\"\n , role = c(\"aut\")\n , comment = \"R interface\"\n , email = \"alan@rstudio.com\"\n ),\n person(\n \"Greg\", \"Lin\"\n , role = c(\"aut\")\n , comment = \"R interface\"\n , email = \"glin@glin.io\"\n )\n )", + "Maintainer": "Kent Russell ", + "Description": "Make it easy to use 'React' in R with 'htmlwidget' scaffolds,\n helper dependency functions, an embedded 'Babel' 'transpiler',\n and examples.", + "URL": "https://github.com/react-R/reactR", + "BugReports": "https://github.com/react-R/reactR/issues", + "License": "MIT + file LICENSE", + "Encoding": "UTF-8", + "Imports": "htmltools", + "Suggests": "htmlwidgets (>= 1.5.3), rmarkdown, shiny, V8, knitr, usethis,\njsonlite", + "RoxygenNote": "7.3.2", + "VignetteBuilder": "knitr", + "NeedsCompilation": "no", + "Packaged": "2024-09-14 13:24:57 UTC; kentr", + "Author": "Facebook Inc [aut, cph] (React library in lib, https://reactjs.org/;\n see AUTHORS for full list of contributors),\n Michel Weststrate [aut, cph] (mobx library in lib,\n https://github.com/mobxjs),\n Kent Russell [aut, cre] (R interface),\n Alan Dipert [aut] (R interface),\n Greg Lin [aut] (R interface)", + "Repository": "RSPM", + "Date/Publication": "2024-09-14 13:50:02 UTC", + "Built": "R 4.4.0; ; 2026-01-29 00:24:00 UTC; unix", + "RemoteType": "standard", + "RemotePkgRef": "reactR", + "RemoteRef": "reactR", + "RemoteRepos": "https://packagemanager.posit.co/cran/latest", + "RemotePkgPlatform": "source", + "RemoteSha": "0.6.1" + } + }, + "reactable": { + "Source": "CRAN", + "Repository": "https://packagemanager.posit.co/cran/latest", + "description": { + "Package": "reactable", + "Type": "Package", + "Title": "Interactive Data Tables for R", + "Version": "0.4.4", + "Authors@R": "c(\n person(\"Greg\", \"Lin\", email = \"glin@glin.io\", role = c(\"aut\", \"cre\")),\n person(\"Tanner\", \"Linsley\", role = c(\"ctb\", \"cph\"), comment = \"React Table library\"),\n person(family = \"Emotion team and other contributors\", role = c(\"ctb\", \"cph\"),\n comment = \"Emotion library\"),\n person(\"Kent\", \"Russell\", role = c(\"ctb\", \"cph\"), comment = \"reactR package\"),\n person(\"Ramnath\", \"Vaidyanathan\", role = c(\"ctb\", \"cph\"), comment = \"htmlwidgets package\"),\n person(\"Joe\", \"Cheng\", role = c(\"ctb\", \"cph\"), comment = \"htmlwidgets package\"),\n person(\"JJ\", \"Allaire\", role = c(\"ctb\", \"cph\"), comment = \"htmlwidgets package\"),\n person(\"Yihui\", \"Xie\", role = c(\"ctb\", \"cph\"), comment = \"htmlwidgets package\"),\n person(\"Kenton\", \"Russell\", role = c(\"ctb\", \"cph\"), comment = \"htmlwidgets package\"),\n person(family = \"Facebook, Inc. and its affiliates\", role = c(\"ctb\", \"cph\"), comment = \"React library\"),\n person(family = \"FormatJS\", role = c(\"ctb\", \"cph\"), comment = \"FormatJS libraries\"),\n person(family = \"Feross Aboukhadijeh, and other contributors\", role = c(\"ctb\", \"cph\"),\n comment = \"buffer library\"),\n person(\"Roman\", \"Shtylman\", role = c(\"ctb\", \"cph\"), comment = \"process library\"),\n person(\"James\", \"Halliday\", role = c(\"ctb\", \"cph\"), comment = \"stream-browserify library\"),\n person(family = \"Posit Software, PBC\", role = c(\"fnd\", \"cph\"))\n )", + "Description": "Interactive data tables for R, based on the 'React Table'\n JavaScript library. Provides an HTML widget that can be used in 'R Markdown'\n or 'Quarto' documents, 'Shiny' applications, or viewed from an R console.", + "License": "MIT + file LICENSE", + "URL": "https://glin.github.io/reactable/,\nhttps://github.com/glin/reactable", + "BugReports": "https://github.com/glin/reactable/issues", + "Depends": "R (>= 3.1)", + "Imports": "digest, htmltools (>= 0.5.2), htmlwidgets (>= 1.5.3),\njsonlite, reactR", + "Suggests": "covr, crosstalk, dplyr, fontawesome, knitr, leaflet, MASS,\nrmarkdown, shiny, sparkline, testthat, tippy, V8", + "Encoding": "UTF-8", + "RoxygenNote": "7.2.1", + "Config/testthat/edition": "3", + "NeedsCompilation": "no", + "Packaged": "2023-03-12 00:59:18 UTC; greg", + "Author": "Greg Lin [aut, cre],\n Tanner Linsley [ctb, cph] (React Table library),\n Emotion team and other contributors [ctb, cph] (Emotion library),\n Kent Russell [ctb, cph] (reactR package),\n Ramnath Vaidyanathan [ctb, cph] (htmlwidgets package),\n Joe Cheng [ctb, cph] (htmlwidgets package),\n JJ Allaire [ctb, cph] (htmlwidgets package),\n Yihui Xie [ctb, cph] (htmlwidgets package),\n Kenton Russell [ctb, cph] (htmlwidgets package),\n Facebook, Inc. and its affiliates [ctb, cph] (React library),\n FormatJS [ctb, cph] (FormatJS libraries),\n Feross Aboukhadijeh, and other contributors [ctb, cph] (buffer library),\n Roman Shtylman [ctb, cph] (process library),\n James Halliday [ctb, cph] (stream-browserify library),\n Posit Software, PBC [fnd, cph]", + "Maintainer": "Greg Lin ", + "Repository": "RSPM", + "Date/Publication": "2023-03-12 10:00:10 UTC", + "Built": "R 4.4.0; ; 2026-01-29 00:30:00 UTC; unix", + "RemotePkgRef": "reactable@0.4.4", + "RemoteType": "standard", + "RemoteEtag": "\"b6bb310040f378bebdec0dad982e47ee\"", + "RemotePackaged": "TRUE", + "RemoteRef": "reactable", + "RemoteRepos": "https://packagemanager.posit.co/cran/latest", + "RemotePkgPlatform": "source", + "RemoteSha": "0.4.4" + } + }, + "readr": { + "Source": "CRAN", + "Repository": "https://packagemanager.posit.co/cran/latest", + "description": { + "Package": "readr", + "Title": "Read Rectangular Text Data", + "Version": "2.1.5", + "Authors@R": "c(\n person(\"Hadley\", \"Wickham\", , \"hadley@posit.co\", role = \"aut\"),\n person(\"Jim\", \"Hester\", role = \"aut\"),\n person(\"Romain\", \"Francois\", role = \"ctb\"),\n person(\"Jennifer\", \"Bryan\", , \"jenny@posit.co\", role = c(\"aut\", \"cre\"),\n comment = c(ORCID = \"0000-0002-6983-2759\")),\n person(\"Shelby\", \"Bearrows\", role = \"ctb\"),\n person(\"Posit Software, PBC\", role = c(\"cph\", \"fnd\")),\n person(\"https://github.com/mandreyel/\", role = \"cph\",\n comment = \"mio library\"),\n person(\"Jukka\", \"Jylänki\", role = c(\"ctb\", \"cph\"),\n comment = \"grisu3 implementation\"),\n person(\"Mikkel\", \"Jørgensen\", role = c(\"ctb\", \"cph\"),\n comment = \"grisu3 implementation\")\n )", + "Description": "The goal of 'readr' is to provide a fast and friendly way to\n read rectangular data (like 'csv', 'tsv', and 'fwf'). It is designed\n to flexibly parse many types of data found in the wild, while still\n cleanly failing when data unexpectedly changes.", + "License": "MIT + file LICENSE", + "URL": "https://readr.tidyverse.org, https://github.com/tidyverse/readr", + "BugReports": "https://github.com/tidyverse/readr/issues", + "Depends": "R (>= 3.6)", + "Imports": "cli (>= 3.2.0), clipr, crayon, hms (>= 0.4.1), lifecycle (>=\n0.2.0), methods, R6, rlang, tibble, utils, vroom (>= 1.6.0)", + "Suggests": "covr, curl, datasets, knitr, rmarkdown, spelling, stringi,\ntestthat (>= 3.2.0), tzdb (>= 0.1.1), waldo, withr, xml2", + "LinkingTo": "cpp11, tzdb (>= 0.1.1)", + "VignetteBuilder": "knitr", + "Config/Needs/website": "tidyverse, tidyverse/tidytemplate", + "Config/testthat/edition": "3", + "Config/testthat/parallel": "false", + "Encoding": "UTF-8", + "Language": "en-US", + "RoxygenNote": "7.2.3", + "NeedsCompilation": "yes", + "Packaged": "2024-01-10 21:03:49 UTC; jenny", + "Author": "Hadley Wickham [aut],\n Jim Hester [aut],\n Romain Francois [ctb],\n Jennifer Bryan [aut, cre] (),\n Shelby Bearrows [ctb],\n Posit Software, PBC [cph, fnd],\n https://github.com/mandreyel/ [cph] (mio library),\n Jukka Jylänki [ctb, cph] (grisu3 implementation),\n Mikkel Jørgensen [ctb, cph] (grisu3 implementation)", + "Maintainer": "Jennifer Bryan ", + "Repository": "RSPM", + "Date/Publication": "2024-01-10 23:20:02 UTC", + "Built": "R 4.4.0; x86_64-pc-linux-gnu; 2026-01-29 00:30:12 UTC; unix", + "RemotePkgRef": "readr@2.1.5", + "RemoteType": "standard", + "RemoteEtag": "\"4a20936ed37e2594306b8a43873e43dc\"", + "RemotePackaged": "TRUE", + "RemoteRef": "readr", + "RemoteRepos": "https://packagemanager.posit.co/cran/latest", + "RemotePkgPlatform": "source", + "RemoteSha": "2.1.5" + } + }, + "readxl": { + "Source": "CRAN", + "Repository": "https://packagemanager.posit.co/cran/latest", + "description": { + "Package": "readxl", + "Title": "Read Excel Files", + "Version": "1.4.5", + "Authors@R": "c(\n person(\"Hadley\", \"Wickham\", , \"hadley@posit.co\", role = \"aut\",\n comment = c(ORCID = \"0000-0003-4757-117X\")),\n person(\"Jennifer\", \"Bryan\", , \"jenny@posit.co\", role = c(\"aut\", \"cre\"),\n comment = c(ORCID = \"0000-0002-6983-2759\")),\n person(\"Posit, PBC\", role = c(\"cph\", \"fnd\"),\n comment = \"Copyright holder of all R code and all C/C++ code without explicit copyright attribution\"),\n person(\"Marcin\", \"Kalicinski\", role = c(\"ctb\", \"cph\"),\n comment = \"Author of included RapidXML code\"),\n person(\"Komarov Valery\", role = c(\"ctb\", \"cph\"),\n comment = \"Author of included libxls code\"),\n person(\"Christophe Leitienne\", role = c(\"ctb\", \"cph\"),\n comment = \"Author of included libxls code\"),\n person(\"Bob Colbert\", role = c(\"ctb\", \"cph\"),\n comment = \"Author of included libxls code\"),\n person(\"David Hoerl\", role = c(\"ctb\", \"cph\"),\n comment = \"Author of included libxls code\"),\n person(\"Evan Miller\", role = c(\"ctb\", \"cph\"),\n comment = \"Author of included libxls code\")\n )", + "Description": "Import excel files into R. Supports '.xls' via the embedded\n 'libxls' C library and '.xlsx' via\n the embedded 'RapidXML' C++ library .\n Works on Windows, Mac and Linux without external dependencies.", + "License": "MIT + file LICENSE", + "URL": "https://readxl.tidyverse.org, https://github.com/tidyverse/readxl", + "BugReports": "https://github.com/tidyverse/readxl/issues", + "Depends": "R (>= 3.6)", + "Imports": "cellranger, tibble (>= 2.0.1), utils", + "Suggests": "covr, knitr, rmarkdown, testthat (>= 3.1.6), withr", + "LinkingTo": "cpp11 (>= 0.4.0), progress", + "VignetteBuilder": "knitr", + "Config/Needs/website": "tidyverse/tidytemplate, tidyverse", + "Config/testthat/edition": "3", + "Encoding": "UTF-8", + "Note": "libxls v1.6.3 c199d13", + "RoxygenNote": "7.3.2", + "NeedsCompilation": "yes", + "Packaged": "2025-03-07 07:25:57 UTC; jenny", + "Author": "Hadley Wickham [aut] (),\n Jennifer Bryan [aut, cre] (),\n Posit, PBC [cph, fnd] (Copyright holder of all R code and all C/C++\n code without explicit copyright attribution),\n Marcin Kalicinski [ctb, cph] (Author of included RapidXML code),\n Komarov Valery [ctb, cph] (Author of included libxls code),\n Christophe Leitienne [ctb, cph] (Author of included libxls code),\n Bob Colbert [ctb, cph] (Author of included libxls code),\n David Hoerl [ctb, cph] (Author of included libxls code),\n Evan Miller [ctb, cph] (Author of included libxls code)", + "Maintainer": "Jennifer Bryan ", + "Repository": "RSPM", + "Date/Publication": "2025-03-07 17:10:02 UTC", + "Built": "R 4.4.0; x86_64-pc-linux-gnu; 2026-01-29 00:26:15 UTC; unix", + "RemotePkgRef": "readxl@1.4.5", + "RemoteType": "standard", + "RemoteEtag": "\"fe22250bd725eaf4ef638c9ae3d35c43\"", + "RemotePackaged": "TRUE", + "RemoteRef": "readxl", + "RemoteRepos": "https://packagemanager.posit.co/cran/latest", + "RemotePkgPlatform": "source", + "RemoteSha": "1.4.5" + } + }, + "rematch": { + "Source": "CRAN", + "Repository": "https://packagemanager.posit.co/cran/latest", + "description": { + "Package": "rematch", + "Title": "Match Regular Expressions with a Nicer 'API'", + "Version": "2.0.0", + "Author": "Gabor Csardi", + "Maintainer": "Gabor Csardi ", + "Description": "A small wrapper on 'regexpr' to extract the matches and\n captured groups from the match of a regular expression to a character\n vector.", + "License": "MIT + file LICENSE", + "URL": "https://github.com/gaborcsardi/rematch", + "BugReports": "https://github.com/gaborcsardi/rematch/issues", + "RoxygenNote": "5.0.1.9000", + "Suggests": "covr, testthat", + "Encoding": "UTF-8", + "NeedsCompilation": "no", + "Packaged": "2023-08-30 12:10:51 UTC; gaborcsardi", + "Repository": "RSPM", + "Date/Publication": "2023-08-30 16:50:02 UTC", + "Built": "R 4.4.0; ; 2026-01-29 00:22:14 UTC; unix", + "RemotePkgRef": "rematch@2.0.0", + "RemoteType": "standard", + "RemoteEtag": "\"4dacf9cad45d2164e20716ba64a57cf1\"", + "RemotePackaged": "TRUE", + "RemoteRef": "rematch", + "RemoteRepos": "https://packagemanager.posit.co/cran/latest", + "RemotePkgPlatform": "source", + "RemoteSha": "2.0.0" + } + }, + "renv": { + "Source": "CRAN", + "Repository": "https://packagemanager.posit.co/cran/latest", + "description": { + "Package": "renv", + "Type": "Package", + "Title": "Project Environments", + "Version": "1.1.4", + "Authors@R": "c(\n person(\"Kevin\", \"Ushey\", role = c(\"aut\", \"cre\"), email = \"kevin@rstudio.com\",\n comment = c(ORCID = \"0000-0003-2880-7407\")),\n person(\"Hadley\", \"Wickham\", role = c(\"aut\"), email = \"hadley@rstudio.com\",\n comment = c(ORCID = \"0000-0003-4757-117X\")),\n person(\"Posit Software, PBC\", role = c(\"cph\", \"fnd\"))\n )", + "Description": "A dependency management toolkit for R. Using 'renv', you can create\n and manage project-local R libraries, save the state of these libraries to\n a 'lockfile', and later restore your library as required. Together, these\n tools can help make your projects more isolated, portable, and reproducible.", + "License": "MIT + file LICENSE", + "URL": "https://rstudio.github.io/renv/, https://github.com/rstudio/renv", + "BugReports": "https://github.com/rstudio/renv/issues", + "Imports": "utils", + "Suggests": "BiocManager, cli, compiler, covr, cpp11, devtools, gitcreds,\njsonlite, jsonvalidate, knitr, miniUI, modules, packrat, pak,\nR6, remotes, reticulate, rmarkdown, rstudioapi, shiny,\ntestthat, uuid, waldo, yaml, webfakes", + "Encoding": "UTF-8", + "RoxygenNote": "7.3.2", + "VignetteBuilder": "knitr", + "Config/Needs/website": "tidyverse/tidytemplate", + "Config/testthat/edition": "3", + "Config/testthat/parallel": "true", + "Config/testthat/start-first": "bioconductor,python,install,restore,snapshot,retrieve,remotes", + "NeedsCompilation": "no", + "Packaged": "2025-03-20 16:43:40 UTC; kevin", + "Author": "Kevin Ushey [aut, cre] (),\n Hadley Wickham [aut] (),\n Posit Software, PBC [cph, fnd]", + "Maintainer": "Kevin Ushey ", + "Repository": "RSPM", + "Date/Publication": "2025-03-20 18:10:01 UTC", + "Built": "R 4.4.0; ; 2026-01-29 00:19:03 UTC; unix" + } + }, + "reshape2": { + "Source": "CRAN", + "Repository": "https://packagemanager.posit.co/cran/latest", + "description": { + "Package": "reshape2", + "Title": "Flexibly Reshape Data: A Reboot of the Reshape Package", + "Version": "1.4.4", + "Author": "Hadley Wickham ", + "Maintainer": "Hadley Wickham ", + "Description": "Flexibly restructure and aggregate data using just two\n functions: melt and 'dcast' (or 'acast').", + "License": "MIT + file LICENSE", + "URL": "https://github.com/hadley/reshape", + "BugReports": "https://github.com/hadley/reshape/issues", + "Depends": "R (>= 3.1)", + "Imports": "plyr (>= 1.8.1), Rcpp, stringr", + "Suggests": "covr, lattice, testthat (>= 0.8.0)", + "LinkingTo": "Rcpp", + "Encoding": "UTF-8", + "LazyData": "true", + "RoxygenNote": "7.1.0", + "NeedsCompilation": "yes", + "Packaged": "2020-04-09 12:27:19 UTC; hadley", + "Repository": "RSPM", + "Date/Publication": "2020-04-09 13:50:02 UTC", + "Built": "R 4.4.0; x86_64-pc-linux-gnu; 2026-01-29 00:26:47 UTC; unix", + "RemotePkgRef": "reshape2@1.4.4", + "RemoteType": "standard", + "RemoteEtag": "\"ed29f9eb8cd59d8bcb119795a1df0ad8\"", + "RemotePackaged": "TRUE", + "RemoteRef": "reshape2", + "RemoteRepos": "https://packagemanager.posit.co/cran/latest", + "RemotePkgPlatform": "source", + "RemoteSha": "1.4.4" + } + }, + "rlang": { + "Source": "CRAN", + "Repository": "https://packagemanager.posit.co/cran/latest", + "description": { + "Package": "rlang", + "Version": "1.1.5", + "Title": "Functions for Base Types and Core R and 'Tidyverse' Features", + "Description": "A toolbox for working with base types, core R features\n like the condition system, and core 'Tidyverse' features like tidy\n evaluation.", + "Authors@R": "c(\n person(\"Lionel\", \"Henry\", ,\"lionel@posit.co\", c(\"aut\", \"cre\")),\n person(\"Hadley\", \"Wickham\", ,\"hadley@posit.co\", \"aut\"),\n person(given = \"mikefc\",\n email = \"mikefc@coolbutuseless.com\", \n role = \"cph\", \n comment = \"Hash implementation based on Mike's xxhashlite\"),\n person(given = \"Yann\",\n family = \"Collet\",\n role = \"cph\", \n comment = \"Author of the embedded xxHash library\"),\n person(given = \"Posit, PBC\", role = c(\"cph\", \"fnd\"))\n )", + "License": "MIT + file LICENSE", + "ByteCompile": "true", + "Biarch": "true", + "Depends": "R (>= 3.5.0)", + "Imports": "utils", + "Suggests": "cli (>= 3.1.0), covr, crayon, fs, glue, knitr, magrittr,\nmethods, pillar, rmarkdown, stats, testthat (>= 3.0.0), tibble,\nusethis, vctrs (>= 0.2.3), withr", + "Enhances": "winch", + "Encoding": "UTF-8", + "RoxygenNote": "7.3.2", + "URL": "https://rlang.r-lib.org, https://github.com/r-lib/rlang", + "BugReports": "https://github.com/r-lib/rlang/issues", + "Config/testthat/edition": "3", + "Config/Needs/website": "dplyr, tidyverse/tidytemplate", + "NeedsCompilation": "yes", + "Packaged": "2025-01-17 08:43:17 UTC; lionel", + "Author": "Lionel Henry [aut, cre],\n Hadley Wickham [aut],\n mikefc [cph] (Hash implementation based on Mike's xxhashlite),\n Yann Collet [cph] (Author of the embedded xxHash library),\n Posit, PBC [cph, fnd]", + "Maintainer": "Lionel Henry ", + "Repository": "RSPM", + "Date/Publication": "2025-01-17 14:30:02 UTC", + "Built": "R 4.4.0; x86_64-pc-linux-gnu; 2026-01-29 00:21:39 UTC; unix", + "RemotePkgRef": "rlang@1.1.5", + "RemoteType": "standard", + "RemoteEtag": "\"35ff300582967a2d7c17b004699ca9c8\"", + "RemotePackaged": "TRUE", + "RemoteRef": "rlang", + "RemoteRepos": "https://packagemanager.posit.co/cran/latest", + "RemotePkgPlatform": "source", + "RemoteSha": "1.1.5" + } + }, + "rmarkdown": { + "Source": "CRAN", + "Repository": "https://packagemanager.posit.co/cran/latest", + "description": { + "Type": "Package", + "Package": "rmarkdown", + "Title": "Dynamic Documents for R", + "Version": "2.29", + "Authors@R": "c(\n person(\"JJ\", \"Allaire\", , \"jj@posit.co\", role = \"aut\"),\n person(\"Yihui\", \"Xie\", , \"xie@yihui.name\", role = c(\"aut\", \"cre\"), comment = c(ORCID = \"0000-0003-0645-5666\")),\n person(\"Christophe\", \"Dervieux\", , \"cderv@posit.co\", role = \"aut\", comment = c(ORCID = \"0000-0003-4474-2498\")),\n person(\"Jonathan\", \"McPherson\", , \"jonathan@posit.co\", role = \"aut\"),\n person(\"Javier\", \"Luraschi\", role = \"aut\"),\n person(\"Kevin\", \"Ushey\", , \"kevin@posit.co\", role = \"aut\"),\n person(\"Aron\", \"Atkins\", , \"aron@posit.co\", role = \"aut\"),\n person(\"Hadley\", \"Wickham\", , \"hadley@posit.co\", role = \"aut\"),\n person(\"Joe\", \"Cheng\", , \"joe@posit.co\", role = \"aut\"),\n person(\"Winston\", \"Chang\", , \"winston@posit.co\", role = \"aut\"),\n person(\"Richard\", \"Iannone\", , \"rich@posit.co\", role = \"aut\", comment = c(ORCID = \"0000-0003-3925-190X\")),\n person(\"Andrew\", \"Dunning\", role = \"ctb\", comment = c(ORCID = \"0000-0003-0464-5036\")),\n person(\"Atsushi\", \"Yasumoto\", role = c(\"ctb\", \"cph\"), comment = c(ORCID = \"0000-0002-8335-495X\", cph = \"Number sections Lua filter\")),\n person(\"Barret\", \"Schloerke\", role = \"ctb\"),\n person(\"Carson\", \"Sievert\", role = \"ctb\", comment = c(ORCID = \"0000-0002-4958-2844\")), \n person(\"Devon\", \"Ryan\", , \"dpryan79@gmail.com\", role = \"ctb\", comment = c(ORCID = \"0000-0002-8549-0971\")),\n person(\"Frederik\", \"Aust\", , \"frederik.aust@uni-koeln.de\", role = \"ctb\", comment = c(ORCID = \"0000-0003-4900-788X\")),\n person(\"Jeff\", \"Allen\", , \"jeff@posit.co\", role = \"ctb\"), \n person(\"JooYoung\", \"Seo\", role = \"ctb\", comment = c(ORCID = \"0000-0002-4064-6012\")),\n person(\"Malcolm\", \"Barrett\", role = \"ctb\"),\n person(\"Rob\", \"Hyndman\", , \"Rob.Hyndman@monash.edu\", role = \"ctb\"),\n person(\"Romain\", \"Lesur\", role = \"ctb\"),\n person(\"Roy\", \"Storey\", role = \"ctb\"),\n person(\"Ruben\", \"Arslan\", , \"ruben.arslan@uni-goettingen.de\", role = \"ctb\"),\n person(\"Sergio\", \"Oller\", role = \"ctb\"),\n person(given = \"Posit Software, PBC\", role = c(\"cph\", \"fnd\")),\n person(, \"jQuery UI contributors\", role = c(\"ctb\", \"cph\"), comment = \"jQuery UI library; authors listed in inst/rmd/h/jqueryui/AUTHORS.txt\"),\n person(\"Mark\", \"Otto\", role = \"ctb\", comment = \"Bootstrap library\"),\n person(\"Jacob\", \"Thornton\", role = \"ctb\", comment = \"Bootstrap library\"),\n person(, \"Bootstrap contributors\", role = \"ctb\", comment = \"Bootstrap library\"),\n person(, \"Twitter, Inc\", role = \"cph\", comment = \"Bootstrap library\"),\n person(\"Alexander\", \"Farkas\", role = c(\"ctb\", \"cph\"), comment = \"html5shiv library\"),\n person(\"Scott\", \"Jehl\", role = c(\"ctb\", \"cph\"), comment = \"Respond.js library\"),\n person(\"Ivan\", \"Sagalaev\", role = c(\"ctb\", \"cph\"), comment = \"highlight.js library\"),\n person(\"Greg\", \"Franko\", role = c(\"ctb\", \"cph\"), comment = \"tocify library\"),\n person(\"John\", \"MacFarlane\", role = c(\"ctb\", \"cph\"), comment = \"Pandoc templates\"),\n person(, \"Google, Inc.\", role = c(\"ctb\", \"cph\"), comment = \"ioslides library\"),\n person(\"Dave\", \"Raggett\", role = \"ctb\", comment = \"slidy library\"),\n person(, \"W3C\", role = \"cph\", comment = \"slidy library\"),\n person(\"Dave\", \"Gandy\", role = c(\"ctb\", \"cph\"), comment = \"Font-Awesome\"),\n person(\"Ben\", \"Sperry\", role = \"ctb\", comment = \"Ionicons\"),\n person(, \"Drifty\", role = \"cph\", comment = \"Ionicons\"),\n person(\"Aidan\", \"Lister\", role = c(\"ctb\", \"cph\"), comment = \"jQuery StickyTabs\"),\n person(\"Benct Philip\", \"Jonsson\", role = c(\"ctb\", \"cph\"), comment = \"pagebreak Lua filter\"),\n person(\"Albert\", \"Krewinkel\", role = c(\"ctb\", \"cph\"), comment = \"pagebreak Lua filter\")\n )", + "Description": "Convert R Markdown documents into a variety of formats.", + "License": "GPL-3", + "URL": "https://github.com/rstudio/rmarkdown,\nhttps://pkgs.rstudio.com/rmarkdown/", + "BugReports": "https://github.com/rstudio/rmarkdown/issues", + "Depends": "R (>= 3.0)", + "Imports": "bslib (>= 0.2.5.1), evaluate (>= 0.13), fontawesome (>=\n0.5.0), htmltools (>= 0.5.1), jquerylib, jsonlite, knitr (>=\n1.43), methods, tinytex (>= 0.31), tools, utils, xfun (>=\n0.36), yaml (>= 2.1.19)", + "Suggests": "digest, dygraphs, fs, rsconnect, downlit (>= 0.4.0), katex\n(>= 1.4.0), sass (>= 0.4.0), shiny (>= 1.6.0), testthat (>=\n3.0.3), tibble, vctrs, cleanrmd, withr (>= 2.4.2), xml2", + "VignetteBuilder": "knitr", + "Config/Needs/website": "rstudio/quillt, pkgdown", + "Config/testthat/edition": "3", + "Encoding": "UTF-8", + "RoxygenNote": "7.3.2", + "SystemRequirements": "pandoc (>= 1.14) - http://pandoc.org", + "NeedsCompilation": "no", + "Packaged": "2024-11-01 19:32:48 UTC; runner", + "Author": "JJ Allaire [aut],\n Yihui Xie [aut, cre] (),\n Christophe Dervieux [aut] (),\n Jonathan McPherson [aut],\n Javier Luraschi [aut],\n Kevin Ushey [aut],\n Aron Atkins [aut],\n Hadley Wickham [aut],\n Joe Cheng [aut],\n Winston Chang [aut],\n Richard Iannone [aut] (),\n Andrew Dunning [ctb] (),\n Atsushi Yasumoto [ctb, cph] (,\n Number sections Lua filter),\n Barret Schloerke [ctb],\n Carson Sievert [ctb] (),\n Devon Ryan [ctb] (),\n Frederik Aust [ctb] (),\n Jeff Allen [ctb],\n JooYoung Seo [ctb] (),\n Malcolm Barrett [ctb],\n Rob Hyndman [ctb],\n Romain Lesur [ctb],\n Roy Storey [ctb],\n Ruben Arslan [ctb],\n Sergio Oller [ctb],\n Posit Software, PBC [cph, fnd],\n jQuery UI contributors [ctb, cph] (jQuery UI library; authors listed in\n inst/rmd/h/jqueryui/AUTHORS.txt),\n Mark Otto [ctb] (Bootstrap library),\n Jacob Thornton [ctb] (Bootstrap library),\n Bootstrap contributors [ctb] (Bootstrap library),\n Twitter, Inc [cph] (Bootstrap library),\n Alexander Farkas [ctb, cph] (html5shiv library),\n Scott Jehl [ctb, cph] (Respond.js library),\n Ivan Sagalaev [ctb, cph] (highlight.js library),\n Greg Franko [ctb, cph] (tocify library),\n John MacFarlane [ctb, cph] (Pandoc templates),\n Google, Inc. [ctb, cph] (ioslides library),\n Dave Raggett [ctb] (slidy library),\n W3C [cph] (slidy library),\n Dave Gandy [ctb, cph] (Font-Awesome),\n Ben Sperry [ctb] (Ionicons),\n Drifty [cph] (Ionicons),\n Aidan Lister [ctb, cph] (jQuery StickyTabs),\n Benct Philip Jonsson [ctb, cph] (pagebreak Lua filter),\n Albert Krewinkel [ctb, cph] (pagebreak Lua filter)", + "Maintainer": "Yihui Xie ", + "Repository": "RSPM", + "Date/Publication": "2024-11-04 12:30:09 UTC", + "Built": "R 4.4.0; ; 2026-01-29 00:29:42 UTC; unix", + "RemotePkgRef": "rmarkdown@2.29", + "RemoteType": "standard", + "RemoteEtag": "\"a894e06809f38a190f835dc32c77a7de\"", + "RemotePackaged": "TRUE", + "RemoteRef": "rmarkdown", + "RemoteRepos": "https://packagemanager.posit.co/cran/latest", + "RemotePkgPlatform": "source", + "RemoteSha": "2.29" + } + }, + "rprojroot": { + "Source": "CRAN", + "Repository": "https://packagemanager.posit.co/cran/latest", + "description": { + "Package": "rprojroot", + "Title": "Finding Files in Project Subdirectories", + "Version": "2.0.4", + "Authors@R": "\n person(given = \"Kirill\",\n family = \"M\\u00fcller\",\n role = c(\"aut\", \"cre\"),\n email = \"kirill@cynkra.com\",\n comment = c(ORCID = \"0000-0002-1416-3412\"))", + "Description": "Robust, reliable and flexible paths to files below\n a project root. The 'root' of a project is defined as a directory that\n matches a certain criterion, e.g., it contains a certain regular file.", + "License": "MIT + file LICENSE", + "URL": "https://rprojroot.r-lib.org/, https://github.com/r-lib/rprojroot", + "BugReports": "https://github.com/r-lib/rprojroot/issues", + "Depends": "R (>= 3.0.0)", + "Suggests": "covr, knitr, lifecycle, mockr, rlang, rmarkdown, testthat (>=\n3.0.0), withr", + "VignetteBuilder": "knitr", + "Config/testthat/edition": "3", + "Encoding": "UTF-8", + "RoxygenNote": "7.2.3", + "NeedsCompilation": "no", + "Packaged": "2023-11-05 06:47:23 UTC; kirill", + "Author": "Kirill Müller [aut, cre] ()", + "Maintainer": "Kirill Müller ", + "Repository": "RSPM", + "Date/Publication": "2023-11-05 10:20:02 UTC", + "Built": "R 4.4.0; ; 2026-01-29 00:21:28 UTC; unix", + "RemotePkgRef": "rprojroot@2.0.4", + "RemoteType": "standard", + "RemoteEtag": "\"096c7005b18cff4833a2c8cba3dd23e2\"", + "RemotePackaged": "TRUE", + "RemoteRef": "rprojroot", + "RemoteRepos": "https://packagemanager.posit.co/cran/latest", + "RemotePkgPlatform": "source", + "RemoteSha": "2.0.4" + } + }, + "sass": { + "Source": "CRAN", + "Repository": "https://packagemanager.posit.co/cran/latest", + "description": { + "Type": "Package", + "Package": "sass", + "Version": "0.4.9", + "Title": "Syntactically Awesome Style Sheets ('Sass')", + "Description": "An 'SCSS' compiler, powered by the 'LibSass' library. With this,\n R developers can use variables, inheritance, and functions to generate\n dynamic style sheets. The package uses the 'Sass CSS' extension language,\n which is stable, powerful, and CSS compatible.", + "Authors@R": "c(\n person(\"Joe\", \"Cheng\", , \"joe@rstudio.com\", \"aut\"),\n person(\"Timothy\", \"Mastny\", , \"tim.mastny@gmail.com\", \"aut\"),\n person(\"Richard\", \"Iannone\", , \"rich@rstudio.com\", \"aut\",\n comment = c(ORCID = \"0000-0003-3925-190X\")),\n person(\"Barret\", \"Schloerke\", , \"barret@rstudio.com\", \"aut\",\n comment = c(ORCID = \"0000-0001-9986-114X\")),\n person(\"Carson\", \"Sievert\", , \"carson@rstudio.com\", c(\"aut\", \"cre\"),\n comment = c(ORCID = \"0000-0002-4958-2844\")),\n person(\"Christophe\", \"Dervieux\", , \"cderv@rstudio.com\", c(\"ctb\"),\n comment = c(ORCID = \"0000-0003-4474-2498\")),\n person(family = \"RStudio\", role = c(\"cph\", \"fnd\")),\n person(family = \"Sass Open Source Foundation\", role = c(\"ctb\", \"cph\"),\n comment = \"LibSass library\"),\n person(\"Greter\", \"Marcel\", role = c(\"ctb\", \"cph\"),\n comment = \"LibSass library\"),\n person(\"Mifsud\", \"Michael\", role = c(\"ctb\", \"cph\"),\n comment = \"LibSass library\"),\n person(\"Hampton\", \"Catlin\", role = c(\"ctb\", \"cph\"),\n comment = \"LibSass library\"),\n person(\"Natalie\", \"Weizenbaum\", role = c(\"ctb\", \"cph\"),\n comment = \"LibSass library\"),\n person(\"Chris\", \"Eppstein\", role = c(\"ctb\", \"cph\"),\n comment = \"LibSass library\"),\n person(\"Adams\", \"Joseph\", role = c(\"ctb\", \"cph\"),\n comment = \"json.cpp\"),\n person(\"Trifunovic\", \"Nemanja\", role = c(\"ctb\", \"cph\"),\n comment = \"utf8.h\")\n )", + "License": "MIT + file LICENSE", + "URL": "https://rstudio.github.io/sass/, https://github.com/rstudio/sass", + "BugReports": "https://github.com/rstudio/sass/issues", + "Encoding": "UTF-8", + "RoxygenNote": "7.3.1", + "SystemRequirements": "GNU make", + "Imports": "fs (>= 1.2.4), rlang (>= 0.4.10), htmltools (>= 0.5.1), R6,\nrappdirs", + "Suggests": "testthat, knitr, rmarkdown, withr, shiny, curl", + "VignetteBuilder": "knitr", + "Config/testthat/edition": "3", + "NeedsCompilation": "yes", + "Packaged": "2024-03-15 21:58:01 UTC; cpsievert", + "Author": "Joe Cheng [aut],\n Timothy Mastny [aut],\n Richard Iannone [aut] (),\n Barret Schloerke [aut] (),\n Carson Sievert [aut, cre] (),\n Christophe Dervieux [ctb] (),\n RStudio [cph, fnd],\n Sass Open Source Foundation [ctb, cph] (LibSass library),\n Greter Marcel [ctb, cph] (LibSass library),\n Mifsud Michael [ctb, cph] (LibSass library),\n Hampton Catlin [ctb, cph] (LibSass library),\n Natalie Weizenbaum [ctb, cph] (LibSass library),\n Chris Eppstein [ctb, cph] (LibSass library),\n Adams Joseph [ctb, cph] (json.cpp),\n Trifunovic Nemanja [ctb, cph] (utf8.h)", + "Maintainer": "Carson Sievert ", + "Repository": "RSPM", + "Date/Publication": "2024-03-15 22:30:02 UTC", + "Built": "R 4.4.0; x86_64-pc-linux-gnu; 2026-01-29 00:23:46 UTC; unix", + "RemotePkgRef": "sass@0.4.9", + "RemoteType": "standard", + "RemoteEtag": "\"f2d6b3a0577f3d79d96b43106aed89c8\"", + "RemotePackaged": "TRUE", + "RemoteRef": "sass", + "RemoteRepos": "https://packagemanager.posit.co/cran/latest", + "RemotePkgPlatform": "source", + "RemoteSha": "0.4.9" + } + }, + "scales": { + "Source": "CRAN", + "Repository": "https://packagemanager.posit.co/cran/latest", + "description": { + "Package": "scales", + "Title": "Scale Functions for Visualization", + "Version": "1.4.0", + "Authors@R": "c(\n person(\"Hadley\", \"Wickham\", , \"hadley@posit.co\", role = \"aut\"),\n person(\"Thomas Lin\", \"Pedersen\", , \"thomas.pedersen@posit.co\", role = c(\"cre\", \"aut\"),\n comment = c(ORCID = \"0000-0002-5147-4711\")),\n person(\"Dana\", \"Seidel\", role = \"aut\"),\n person(\"Posit Software, PBC\", role = c(\"cph\", \"fnd\"),\n comment = c(ROR = \"03wc8by49\"))\n )", + "Description": "Graphical scales map data to aesthetics, and provide methods\n for automatically determining breaks and labels for axes and legends.", + "License": "MIT + file LICENSE", + "URL": "https://scales.r-lib.org, https://github.com/r-lib/scales", + "BugReports": "https://github.com/r-lib/scales/issues", + "Depends": "R (>= 4.1)", + "Imports": "cli, farver (>= 2.0.3), glue, labeling, lifecycle, R6,\nRColorBrewer, rlang (>= 1.1.0), viridisLite", + "Suggests": "bit64, covr, dichromat, ggplot2, hms (>= 0.5.0), stringi,\ntestthat (>= 3.0.0)", + "Config/Needs/website": "tidyverse/tidytemplate", + "Config/testthat/edition": "3", + "Config/usethis/last-upkeep": "2025-04-23", + "Encoding": "UTF-8", + "LazyLoad": "yes", + "RoxygenNote": "7.3.2", + "NeedsCompilation": "no", + "Packaged": "2025-04-23 18:27:04 UTC; thomas", + "Author": "Hadley Wickham [aut],\n Thomas Lin Pedersen [cre, aut]\n (),\n Dana Seidel [aut],\n Posit Software, PBC [cph, fnd] (03wc8by49)", + "Maintainer": "Thomas Lin Pedersen ", + "Repository": "RSPM", + "Date/Publication": "2025-04-24 11:00:02 UTC", + "Built": "R 4.4.0; ; 2026-01-29 00:24:21 UTC; unix", + "RemoteType": "standard", + "RemotePkgRef": "scales", + "RemoteRef": "scales", + "RemoteRepos": "https://packagemanager.posit.co/cran/latest", + "RemotePkgPlatform": "source", + "RemoteSha": "1.4.0" + } + }, + "shiny": { + "Source": "CRAN", + "Repository": "https://packagemanager.posit.co/cran/latest", + "description": { + "Package": "shiny", + "Type": "Package", + "Title": "Web Application Framework for R", + "Version": "1.10.0", + "Authors@R": "c(\n person(\"Winston\", \"Chang\", role = c(\"aut\", \"cre\"), email = \"winston@posit.co\", comment = c(ORCID = \"0000-0002-1576-2126\")),\n person(\"Joe\", \"Cheng\", role = \"aut\", email = \"joe@posit.co\"),\n person(\"JJ\", \"Allaire\", role = \"aut\", email = \"jj@posit.co\"),\n person(\"Carson\", \"Sievert\", role = \"aut\", email = \"carson@posit.co\", comment = c(ORCID = \"0000-0002-4958-2844\")),\n person(\"Barret\", \"Schloerke\", role = \"aut\", email = \"barret@posit.co\", comment = c(ORCID = \"0000-0001-9986-114X\")),\n person(\"Yihui\", \"Xie\", role = \"aut\", email = \"yihui@posit.co\"),\n person(\"Jeff\", \"Allen\", role = \"aut\"),\n person(\"Jonathan\", \"McPherson\", role = \"aut\", email = \"jonathan@posit.co\"),\n person(\"Alan\", \"Dipert\", role = \"aut\"),\n person(\"Barbara\", \"Borges\", role = \"aut\"),\n person(\"Posit Software, PBC\", role = c(\"cph\", \"fnd\")),\n person(family = \"jQuery Foundation\", role = \"cph\",\n comment = \"jQuery library and jQuery UI library\"),\n person(family = \"jQuery contributors\", role = c(\"ctb\", \"cph\"),\n comment = \"jQuery library; authors listed in inst/www/shared/jquery-AUTHORS.txt\"),\n person(family = \"jQuery UI contributors\", role = c(\"ctb\", \"cph\"),\n comment = \"jQuery UI library; authors listed in inst/www/shared/jqueryui/AUTHORS.txt\"),\n person(\"Mark\", \"Otto\", role = \"ctb\",\n comment = \"Bootstrap library\"),\n person(\"Jacob\", \"Thornton\", role = \"ctb\",\n comment = \"Bootstrap library\"),\n person(family = \"Bootstrap contributors\", role = \"ctb\",\n comment = \"Bootstrap library\"),\n person(family = \"Twitter, Inc\", role = \"cph\",\n comment = \"Bootstrap library\"),\n person(\"Prem Nawaz\", \"Khan\", role = \"ctb\",\n comment = \"Bootstrap accessibility plugin\"),\n person(\"Victor\", \"Tsaran\", role = \"ctb\",\n comment = \"Bootstrap accessibility plugin\"),\n person(\"Dennis\", \"Lembree\", role = \"ctb\",\n comment = \"Bootstrap accessibility plugin\"),\n person(\"Srinivasu\", \"Chakravarthula\", role = \"ctb\",\n comment = \"Bootstrap accessibility plugin\"),\n person(\"Cathy\", \"O'Connor\", role = \"ctb\",\n comment = \"Bootstrap accessibility plugin\"),\n person(family = \"PayPal, Inc\", role = \"cph\",\n comment = \"Bootstrap accessibility plugin\"),\n person(\"Stefan\", \"Petre\", role = c(\"ctb\", \"cph\"),\n comment = \"Bootstrap-datepicker library\"),\n person(\"Andrew\", \"Rowls\", role = c(\"ctb\", \"cph\"),\n comment = \"Bootstrap-datepicker library\"),\n person(\"Brian\", \"Reavis\", role = c(\"ctb\", \"cph\"),\n comment = \"selectize.js library\"),\n person(\"Salmen\", \"Bejaoui\", role = c(\"ctb\", \"cph\"),\n comment = \"selectize-plugin-a11y library\"),\n person(\"Denis\", \"Ineshin\", role = c(\"ctb\", \"cph\"),\n comment = \"ion.rangeSlider library\"),\n person(\"Sami\", \"Samhuri\", role = c(\"ctb\", \"cph\"),\n comment = \"Javascript strftime library\"),\n person(family = \"SpryMedia Limited\", role = c(\"ctb\", \"cph\"),\n comment = \"DataTables library\"),\n person(\"John\", \"Fraser\", role = c(\"ctb\", \"cph\"),\n comment = \"showdown.js library\"),\n person(\"John\", \"Gruber\", role = c(\"ctb\", \"cph\"),\n comment = \"showdown.js library\"),\n person(\"Ivan\", \"Sagalaev\", role = c(\"ctb\", \"cph\"),\n comment = \"highlight.js library\"),\n person(family = \"R Core Team\", role = c(\"ctb\", \"cph\"),\n comment = \"tar implementation from R\")\n )", + "Description": "Makes it incredibly easy to build interactive web\n applications with R. Automatic \"reactive\" binding between inputs and\n outputs and extensive prebuilt widgets make it possible to build\n beautiful, responsive, and powerful applications with minimal effort.", + "License": "GPL-3 | file LICENSE", + "Depends": "R (>= 3.0.2), methods", + "Imports": "utils, grDevices, httpuv (>= 1.5.2), mime (>= 0.3), jsonlite\n(>= 0.9.16), xtable, fontawesome (>= 0.4.0), htmltools (>=\n0.5.4), R6 (>= 2.0), sourcetools, later (>= 1.0.0), promises\n(>= 1.3.2), tools, crayon, rlang (>= 0.4.10), fastmap (>=\n1.1.1), withr, commonmark (>= 1.7), glue (>= 1.3.2), bslib (>=\n0.6.0), cachem (>= 1.1.0), lifecycle (>= 0.2.0)", + "Suggests": "coro (>= 1.1.0), datasets, DT, Cairo (>= 1.5-5), testthat (>=\n3.0.0), knitr (>= 1.6), markdown, rmarkdown, ggplot2, reactlog\n(>= 1.0.0), magrittr, yaml, future, dygraphs, ragg, showtext,\nsass", + "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'\n'bind-event.R' 'bookmark-state-local.R' 'bookmark-state.R'\n'bootstrap-deprecated.R' 'bootstrap-layout.R' 'conditions.R'\n'map.R' 'utils.R' 'bootstrap.R' 'busy-indicators-spinners.R'\n'busy-indicators.R' 'cache-utils.R' 'deprecated.R' 'devmode.R'\n'diagnose.R' 'extended-task.R' 'fileupload.R' 'graph.R'\n'reactives.R' 'reactive-domains.R' 'history.R' 'hooks.R'\n'html-deps.R' 'image-interact-opts.R' 'image-interact.R'\n'imageutils.R' 'input-action.R' 'input-checkbox.R'\n'input-checkboxgroup.R' 'input-date.R' 'input-daterange.R'\n'input-file.R' 'input-numeric.R' 'input-password.R'\n'input-radiobuttons.R' 'input-select.R' 'input-slider.R'\n'input-submit.R' 'input-text.R' 'input-textarea.R'\n'input-utils.R' 'insert-tab.R' 'insert-ui.R' 'jqueryui.R'\n'knitr.R' 'middleware-shiny.R' 'middleware.R' 'timer.R'\n'shiny.R' 'mock-session.R' 'modal.R' 'modules.R'\n'notifications.R' 'priorityqueue.R' 'progress.R' 'react.R'\n'reexports.R' 'render-cached-plot.R' 'render-plot.R'\n'render-table.R' 'run-url.R' 'runapp.R' 'serializers.R'\n'server-input-handlers.R' 'server-resource-paths.R' 'server.R'\n'shiny-options.R' 'shiny-package.R' 'shinyapp.R' 'shinyui.R'\n'shinywrappers.R' 'showcase.R' 'snapshot.R' 'staticimports.R'\n'tar.R' 'test-export.R' 'test-server.R' 'test.R'\n'update-input.R' 'utils-lang.R' 'version_bs_date_picker.R'\n'version_ion_range_slider.R' 'version_jquery.R'\n'version_jqueryui.R' 'version_selectize.R' 'version_strftime.R'\n'viewer.R'", + "RoxygenNote": "7.3.2", + "Encoding": "UTF-8", + "RdMacros": "lifecycle", + "Config/testthat/edition": "3", + "Config/Needs/check": "shinytest2", + "NeedsCompilation": "no", + "Packaged": "2024-12-13 21:47:15 UTC; cpsievert", + "Author": "Winston Chang [aut, cre] (),\n Joe Cheng [aut],\n JJ Allaire [aut],\n Carson Sievert [aut] (),\n Barret Schloerke [aut] (),\n Yihui Xie [aut],\n Jeff Allen [aut],\n Jonathan McPherson [aut],\n Alan Dipert [aut],\n Barbara Borges [aut],\n Posit Software, PBC [cph, fnd],\n jQuery Foundation [cph] (jQuery library and jQuery UI library),\n jQuery contributors [ctb, cph] (jQuery library; authors listed in\n inst/www/shared/jquery-AUTHORS.txt),\n jQuery UI contributors [ctb, cph] (jQuery UI library; authors listed in\n inst/www/shared/jqueryui/AUTHORS.txt),\n Mark Otto [ctb] (Bootstrap library),\n Jacob Thornton [ctb] (Bootstrap library),\n Bootstrap contributors [ctb] (Bootstrap library),\n Twitter, Inc [cph] (Bootstrap library),\n Prem Nawaz Khan [ctb] (Bootstrap accessibility plugin),\n Victor Tsaran [ctb] (Bootstrap accessibility plugin),\n Dennis Lembree [ctb] (Bootstrap accessibility plugin),\n Srinivasu Chakravarthula [ctb] (Bootstrap accessibility plugin),\n Cathy O'Connor [ctb] (Bootstrap accessibility plugin),\n PayPal, Inc [cph] (Bootstrap accessibility plugin),\n Stefan Petre [ctb, cph] (Bootstrap-datepicker library),\n Andrew Rowls [ctb, cph] (Bootstrap-datepicker library),\n Brian Reavis [ctb, cph] (selectize.js library),\n Salmen Bejaoui [ctb, cph] (selectize-plugin-a11y library),\n Denis Ineshin [ctb, cph] (ion.rangeSlider library),\n Sami Samhuri [ctb, cph] (Javascript strftime library),\n SpryMedia Limited [ctb, cph] (DataTables library),\n John Fraser [ctb, cph] (showdown.js library),\n John Gruber [ctb, cph] (showdown.js library),\n Ivan Sagalaev [ctb, cph] (highlight.js library),\n R Core Team [ctb, cph] (tar implementation from R)", + "Maintainer": "Winston Chang ", + "Repository": "RSPM", + "Date/Publication": "2024-12-14 00:10:02 UTC", + "Built": "R 4.4.0; ; 2026-01-29 00:29:43 UTC; unix", + "RemotePkgRef": "shiny@1.10.0", + "RemoteType": "standard", + "RemoteEtag": "\"8cf5b25932d9b2c2a7c0f98eccb08b14\"", + "RemotePackaged": "TRUE", + "RemoteRef": "shiny", + "RemoteRepos": "https://packagemanager.posit.co/cran/latest", + "RemotePkgPlatform": "source", + "RemoteSha": "1.10.0" + } + }, + "shinyTime": { + "Source": "CRAN", + "Repository": "https://packagemanager.posit.co/cran/latest", + "description": { + "Package": "shinyTime", + "Type": "Package", + "Title": "A Time Input Widget for Shiny", + "Version": "1.0.3", + "Authors@R": "person(\"Gerhard\", \"Burger\", email = \"burger.ga@gmail.com\", role = c(\"aut\", \"cre\"), comment = c(ORCID = \"0000-0003-1062-5576\"))", + "Description": "Provides a time input widget for Shiny. This widget allows intuitive time input in the\n '[hh]:[mm]:[ss]' or '[hh]:[mm]' (24H) format by using a separate numeric input for each time\n component. The interface with R uses date-time objects. See the project page for more\n information and examples.", + "License": "GPL-3 | file LICENSE", + "Imports": "htmltools, shiny", + "URL": "https://burgerga.github.io/shinyTime/,\nhttps://github.com/burgerga/shinyTime", + "BugReports": "https://github.com/burgerga/shinyTime/issues", + "RoxygenNote": "7.2.1", + "Encoding": "UTF-8", + "Language": "en-US", + "Suggests": "testthat (>= 2.1.0), spelling, hms", + "NeedsCompilation": "no", + "Packaged": "2022-08-19 20:56:31 UTC; gerhard", + "Author": "Gerhard Burger [aut, cre] ()", + "Maintainer": "Gerhard Burger ", + "Repository": "RSPM", + "Date/Publication": "2022-08-19 21:30:02 UTC", + "Built": "R 4.4.0; ; 2026-01-29 00:30:25 UTC; unix", + "RemoteType": "standard", + "RemotePkgRef": "shinyTime", + "RemoteRef": "shinyTime", + "RemoteRepos": "https://packagemanager.posit.co/cran/latest", + "RemotePkgPlatform": "source", + "RemoteSha": "1.0.3" + } + }, + "shinyWidgets": { + "Source": "CRAN", + "Repository": "https://packagemanager.posit.co/cran/latest", + "description": { + "Package": "shinyWidgets", + "Title": "Custom Inputs Widgets for Shiny", + "Version": "0.9.0", + "Authors@R": "c(\n person(\"Victor\", \"Perrier\", email = \"victor.perrier@dreamrs.fr\", role = c(\"aut\", \"cre\", \"cph\")),\n person(\"Fanny\", \"Meyer\", role = \"aut\"),\n person(\"David\", \"Granjon\", role = \"aut\"),\n person(\"Ian\", \"Fellows\", role = \"ctb\", comment = \"Methods for mutating vertical tabs & updateMultiInput\"),\n person(\"Wil\", \"Davis\", role = \"ctb\", comment = \"numericRangeInput function\"),\n person(\"Spencer\", \"Matthews\", role = \"ctb\", comment = \"autoNumeric methods\"),\n person(family = \"JavaScript and CSS libraries authors\", role = c(\"ctb\", \"cph\"), comment = \"All authors are listed in LICENSE.md\")\n )", + "Description": "Collection of custom input controls and user interface components for 'Shiny' applications. \n Give your applications a unique and colorful style !", + "URL": "https://github.com/dreamRs/shinyWidgets,\nhttps://dreamrs.github.io/shinyWidgets/", + "BugReports": "https://github.com/dreamRs/shinyWidgets/issues", + "License": "GPL-3", + "Encoding": "UTF-8", + "LazyData": "true", + "RoxygenNote": "7.3.2", + "Depends": "R (>= 3.1.0)", + "Imports": "bslib, sass, shiny (>= 1.6.0), htmltools (>= 0.5.1), jsonlite,\ngrDevices, rlang", + "Suggests": "testthat, covr, ggplot2, DT, scales, shinydashboard,\nshinydashboardPlus", + "NeedsCompilation": "no", + "Packaged": "2025-02-21 09:09:48 UTC; perri", + "Author": "Victor Perrier [aut, cre, cph],\n Fanny Meyer [aut],\n David Granjon [aut],\n Ian Fellows [ctb] (Methods for mutating vertical tabs &\n updateMultiInput),\n Wil Davis [ctb] (numericRangeInput function),\n Spencer Matthews [ctb] (autoNumeric methods),\n JavaScript and CSS libraries authors [ctb, cph] (All authors are listed\n in LICENSE.md)", + "Maintainer": "Victor Perrier ", + "Repository": "RSPM", + "Date/Publication": "2025-02-21 12:30:02 UTC", + "Built": "R 4.4.0; ; 2026-01-29 00:30:32 UTC; unix", + "RemotePkgRef": "shinyWidgets@0.9.0", + "RemoteType": "standard", + "RemoteEtag": "\"24bd9668b559e3387d458a7401fbad20\"", + "RemotePackaged": "TRUE", + "RemoteRef": "shinyWidgets", + "RemoteRepos": "https://packagemanager.posit.co/cran/latest", + "RemotePkgPlatform": "source", + "RemoteSha": "0.9.0" + } + }, + "shinyjs": { + "Source": "CRAN", + "Repository": "https://packagemanager.posit.co/cran/latest", + "description": { + "Package": "shinyjs", + "Title": "Easily Improve the User Experience of Your Shiny Apps in Seconds", + "Version": "2.1.0", + "Authors@R": "person(\"Dean\", \"Attali\", \n email = \"daattali@gmail.com\",\n role = c(\"aut\", \"cre\"),\n comment= c(ORCID=\"0000-0002-5645-3493\"))", + "Description": "Perform common useful JavaScript operations in Shiny apps that will\n greatly improve your apps without having to know any JavaScript. Examples\n include: hiding an element, disabling an input, resetting an input back to\n its original value, delaying code execution by a few seconds, and many more\n useful functions for both the end user and the developer. 'shinyjs' can also\n be used to easily call your own custom JavaScript functions from R.", + "URL": "https://deanattali.com/shinyjs/", + "BugReports": "https://github.com/daattali/shinyjs/issues", + "Depends": "R (>= 3.1.0)", + "Imports": "digest (>= 0.6.8), jsonlite, shiny (>= 1.0.0)", + "Suggests": "htmltools (>= 0.2.9), knitr (>= 1.7), rmarkdown, shinyAce,\nshinydisconnect, testthat (>= 0.9.1)", + "License": "MIT + file LICENSE", + "VignetteBuilder": "knitr", + "RoxygenNote": "7.1.1", + "Encoding": "UTF-8", + "NeedsCompilation": "no", + "Packaged": "2021-12-21 11:32:22 UTC; Dean-X1C", + "Author": "Dean Attali [aut, cre] ()", + "Maintainer": "Dean Attali ", + "Repository": "RSPM", + "Date/Publication": "2021-12-23 10:10:02 UTC", + "Built": "R 4.4.0; ; 2026-01-29 00:30:30 UTC; unix", + "RemotePkgRef": "shinyjs@2.1.0", + "RemoteType": "standard", + "RemoteEtag": "\"c9100a0402cd9315df4ac4ab11ae63ef\"", + "RemotePackaged": "TRUE", + "RemoteRef": "shinyjs", + "RemoteRepos": "https://packagemanager.posit.co/cran/latest", + "RemotePkgPlatform": "source", + "RemoteSha": "2.1.0" + } + }, + "sjlabelled": { + "Source": "CRAN", + "Repository": "https://packagemanager.posit.co/cran/latest", + "description": { + "Package": "sjlabelled", + "Type": "Package", + "Encoding": "UTF-8", + "Title": "Labelled Data Utility Functions", + "Version": "1.2.0", + "Authors@R": "c(\n person(\"Daniel\", \"Lüdecke\", role = c(\"aut\", \"cre\"), email = \"d.luedecke@uke.de\", comment = c(ORCID = \"0000-0002-8895-3206\")),\n person(\"avid\", \"Ranzolin\", role = \"ctb\", email = \"daranzolin@gmail.com\"),\n person(\"Jonathan\", \"De Troye\", role = \"ctb\", email = \"detroyejr@outlook.com\")\n )", + "Maintainer": "Daniel Lüdecke ", + "Description": "Collection of functions dealing with labelled data, like reading and \n writing data between R and other statistical software packages like 'SPSS',\n 'SAS' or 'Stata', and working with labelled data. This includes easy ways \n to get, set or change value and variable label attributes, to convert \n labelled vectors into factors or numeric (and vice versa), or to deal with \n multiple declared missing values.", + "License": "GPL-3", + "Depends": "R (>= 3.4)", + "Imports": "insight, datawizard, stats, tools, utils", + "Suggests": "dplyr, haven (>= 1.1.2), magrittr, sjmisc, sjPlot, knitr,\nrlang, rmarkdown, snakecase, testthat", + "URL": "https://strengejacke.github.io/sjlabelled/", + "BugReports": "https://github.com/strengejacke/sjlabelled/issues", + "RoxygenNote": "7.1.2", + "VignetteBuilder": "knitr", + "NeedsCompilation": "no", + "Packaged": "2022-04-10 09:09:11 UTC; DL", + "Author": "Daniel Lüdecke [aut, cre] (),\n avid Ranzolin [ctb],\n Jonathan De Troye [ctb]", + "Repository": "RSPM", + "Date/Publication": "2022-04-10 09:30:02 UTC", + "Built": "R 4.4.0; ; 2026-01-29 00:23:29 UTC; unix", + "RemotePkgRef": "sjlabelled@1.2.0", + "RemoteType": "standard", + "RemoteEtag": "\"d595dc103418c81aa8fa79fdf3d52e47\"", + "RemotePackaged": "TRUE", + "RemoteRef": "sjlabelled", + "RemoteRepos": "https://packagemanager.posit.co/cran/latest", + "RemotePkgPlatform": "source", + "RemoteSha": "1.2.0" + } + }, + "sourcetools": { + "Source": "CRAN", + "Repository": "https://packagemanager.posit.co/cran/latest", + "description": { + "Package": "sourcetools", + "Type": "Package", + "Title": "Tools for Reading, Tokenizing and Parsing R Code", + "Version": "0.1.7-1", + "Author": "Kevin Ushey", + "Maintainer": "Kevin Ushey ", + "Description": "Tools for the reading and tokenization of R code. The\n 'sourcetools' package provides both an R and C++ interface for the tokenization\n of R code, and helpers for interacting with the tokenized representation of R\n code.", + "License": "MIT + file LICENSE", + "Depends": "R (>= 3.0.2)", + "Suggests": "testthat", + "RoxygenNote": "5.0.1", + "BugReports": "https://github.com/kevinushey/sourcetools/issues", + "Encoding": "UTF-8", + "NeedsCompilation": "yes", + "Packaged": "2023-01-31 18:03:04 UTC; kevin", + "Repository": "RSPM", + "Date/Publication": "2023-02-01 10:10:02 UTC", + "Built": "R 4.4.0; x86_64-pc-linux-gnu; 2026-01-29 00:21:10 UTC; unix", + "RemoteType": "standard", + "RemotePkgRef": "sourcetools", + "RemoteRef": "sourcetools", + "RemoteRepos": "https://packagemanager.posit.co/cran/latest", + "RemotePkgPlatform": "source", + "RemoteSha": "0.1.7-1" + } + }, + "stringdist": { + "Source": "CRAN", + "Repository": "https://packagemanager.posit.co/cran/latest", + "description": { + "Package": "stringdist", + "Maintainer": "Mark van der Loo ", + "License": "GPL-3", + "Title": "Approximate String Matching, Fuzzy Text Search, and String\nDistance Functions", + "Type": "Package", + "LazyLoad": "yes", + "Authors@R": "c( person(\"Mark\", \"van der Loo\", role=c(\"aut\",\"cre\")\n , email=\"mark.vanderloo@gmail.com\"\n , comment= c(ORCID=\"0000-0002-9807-4686\"))\n , person(\"Jan\", \"van der Laan\", role=\"ctb\")\n , person(\"R Core Team\",\"\" , role=\"ctb\")\n , person(\"Nick\",\"Logan\" , role=\"ctb\")\n , person(\"Chris\",\"Muir\" , role=\"ctb\")\n , person(\"Johannes\", \"Gruber\" , role=\"ctb\")\n , person(\"Brian\",\"Ripley\" , role=\"ctb\"))", + "Description": "Implements an approximate string matching version of R's native\n 'match' function. Also offers fuzzy text search based on various string\n distance measures. Can calculate various string distances based on edits\n (Damerau-Levenshtein, Hamming, Levenshtein, optimal sting alignment), qgrams (q-\n gram, cosine, jaccard distance) or heuristic metrics (Jaro, Jaro-Winkler). An\n implementation of soundex is provided as well. Distances can be computed between\n character vectors while taking proper care of encoding or between integer\n vectors representing generic sequences. This package is built for speed and\n runs in parallel by using 'openMP'. An API for C or C++ is exposed as well.\n Reference: MPJ van der Loo (2014) .", + "Version": "0.9.17", + "Depends": "R (>= 2.15.3)", + "URL": "https://github.com/markvanderloo/stringdist", + "BugReports": "https://github.com/markvanderloo/stringdist/issues", + "Suggests": "tinytest", + "Imports": "parallel", + "Encoding": "UTF-8", + "RoxygenNote": "7.3.2", + "NeedsCompilation": "yes", + "Packaged": "2026-01-16 15:16:37 UTC; mark", + "Author": "Mark van der Loo [aut, cre] (ORCID:\n ),\n Jan van der Laan [ctb],\n R Core Team [ctb],\n Nick Logan [ctb],\n Chris Muir [ctb],\n Johannes Gruber [ctb],\n Brian Ripley [ctb]", + "Repository": "RSPM", + "Date/Publication": "2026-01-16 17:00:02 UTC", + "Built": "R 4.4.0; x86_64-pc-linux-gnu; 2026-01-30 16:22:00 UTC; unix", + "RemoteType": "standard", + "RemotePkgRef": "stringdist", + "RemoteRef": "stringdist", + "RemoteRepos": "https://packagemanager.posit.co/cran/latest", + "RemotePkgPlatform": "source", + "RemoteSha": "0.9.17" + } + }, + "stringi": { + "Source": "CRAN", + "Repository": "https://packagemanager.posit.co/cran/latest", + "description": { + "Package": "stringi", + "Version": "1.8.7", + "Date": "2025-03-27", + "Title": "Fast and Portable Character String Processing Facilities", + "Description": "A collection of character string/text/natural language\n processing tools for pattern searching (e.g., with 'Java'-like regular\n expressions or the 'Unicode' collation algorithm), random string generation,\n case mapping, string transliteration, concatenation, sorting, padding,\n wrapping, Unicode normalisation, date-time formatting and parsing,\n and many more. They are fast, consistent, convenient, and -\n thanks to 'ICU' (International Components for Unicode) -\n portable across all locales and platforms. Documentation about 'stringi' is\n provided via its website at and\n the paper by Gagolewski (2022, ).", + "URL": "https://stringi.gagolewski.com/,\nhttps://github.com/gagolews/stringi, https://icu.unicode.org/", + "BugReports": "https://github.com/gagolews/stringi/issues", + "SystemRequirements": "ICU4C (>= 61, optional)", + "Type": "Package", + "Depends": "R (>= 3.4)", + "Imports": "tools, utils, stats", + "Biarch": "TRUE", + "License": "file LICENSE", + "Authors@R": "c(person(given = \"Marek\",\n family = \"Gagolewski\",\n role = c(\"aut\", \"cre\", \"cph\"),\n email = \"marek@gagolewski.com\",\n comment = c(ORCID = \"0000-0003-0637-6028\")),\n person(given = \"Bartek\",\n family = \"Tartanus\",\n role = \"ctb\"),\n person(\"Unicode, Inc. and others\", role=\"ctb\",\n comment = \"ICU4C source code, Unicode Character Database\")\n )", + "RoxygenNote": "7.3.2", + "Encoding": "UTF-8", + "NeedsCompilation": "yes", + "Packaged": "2025-03-27 10:27:19 UTC; gagolews", + "Author": "Marek Gagolewski [aut, cre, cph]\n (),\n Bartek Tartanus [ctb],\n Unicode, Inc. and others [ctb] (ICU4C source code, Unicode Character\n Database)", + "Maintainer": "Marek Gagolewski ", + "License_is_FOSS": "yes", + "Repository": "RSPM", + "Date/Publication": "2025-03-27 13:10:02 UTC", + "Built": "R 4.4.0; x86_64-pc-linux-gnu; 2026-01-29 00:21:55 UTC; unix", + "RemoteType": "standard", + "RemotePkgRef": "stringi", + "RemoteRef": "stringi", + "RemoteRepos": "https://packagemanager.posit.co/cran/latest", + "RemotePkgPlatform": "source", + "RemoteSha": "1.8.7" + } + }, + "stringr": { + "Source": "CRAN", + "Repository": "https://packagemanager.posit.co/cran/latest", + "description": { + "Package": "stringr", + "Title": "Simple, Consistent Wrappers for Common String Operations", + "Version": "1.5.1", + "Authors@R": "c(\n person(\"Hadley\", \"Wickham\", , \"hadley@posit.co\", role = c(\"aut\", \"cre\", \"cph\")),\n person(\"Posit Software, PBC\", role = c(\"cph\", \"fnd\"))\n )", + "Description": "A consistent, simple and easy to use set of wrappers around\n the fantastic 'stringi' package. All function and argument names (and\n positions) are consistent, all functions deal with \"NA\"'s and zero\n length vectors in the same way, and the output from one function is\n easy to feed into the input of another.", + "License": "MIT + file LICENSE", + "URL": "https://stringr.tidyverse.org,\nhttps://github.com/tidyverse/stringr", + "BugReports": "https://github.com/tidyverse/stringr/issues", + "Depends": "R (>= 3.6)", + "Imports": "cli, glue (>= 1.6.1), lifecycle (>= 1.0.3), magrittr, rlang\n(>= 1.0.0), stringi (>= 1.5.3), vctrs (>= 0.4.0)", + "Suggests": "covr, dplyr, gt, htmltools, htmlwidgets, knitr, rmarkdown,\ntestthat (>= 3.0.0), tibble", + "VignetteBuilder": "knitr", + "Config/Needs/website": "tidyverse/tidytemplate", + "Config/testthat/edition": "3", + "Encoding": "UTF-8", + "LazyData": "true", + "RoxygenNote": "7.2.3", + "NeedsCompilation": "no", + "Packaged": "2023-11-14 15:03:52 UTC; hadleywickham", + "Author": "Hadley Wickham [aut, cre, cph],\n Posit Software, PBC [cph, fnd]", + "Maintainer": "Hadley Wickham ", + "Repository": "RSPM", + "Date/Publication": "2023-11-14 23:10:02 UTC", + "Built": "R 4.4.0; ; 2026-01-29 00:26:40 UTC; unix", + "RemotePkgRef": "stringr@1.5.1", + "RemoteType": "standard", + "RemoteEtag": "\"57c35c3381109c313b2a20b6dc092ada\"", + "RemotePackaged": "TRUE", + "RemoteRef": "stringr", + "RemoteRepos": "https://packagemanager.posit.co/cran/latest", + "RemotePkgPlatform": "source", + "RemoteSha": "1.5.1" + } + }, + "survival": { + "Source": "CRAN", + "Repository": "https://packagemanager.posit.co/cran/latest", + "description": { + "Title": "Survival Analysis", + "Priority": "recommended", + "Package": "survival", + "Version": "3.8-3", + "Date": "2024-12-17", + "Depends": "R (>= 3.5.0)", + "Imports": "graphics, Matrix, methods, splines, stats, utils", + "LazyData": "Yes", + "LazyDataCompression": "xz", + "ByteCompile": "Yes", + "Authors@R": "c(person(c(\"Terry\", \"M\"), \"Therneau\",\n email=\"therneau.terry@mayo.edu\",\n\t role=c(\"aut\", \"cre\")),\n person(\"Thomas\", \"Lumley\", role=c(\"ctb\", \"trl\"),\n\t comment=\"original S->R port and R maintainer until 2009\"),\n\t person(\"Atkinson\", \"Elizabeth\", role=\"ctb\"),\n\t person(\"Crowson\", \"Cynthia\", role=\"ctb\"))", + "Description": "Contains the core survival analysis routines, including\n\t definition of Surv objects, \n\t Kaplan-Meier and Aalen-Johansen (multi-state) curves, Cox models,\n\t and parametric accelerated failure time models.", + "License": "LGPL (>= 2)", + "URL": "https://github.com/therneau/survival", + "NeedsCompilation": "yes", + "Packaged": "2024-12-17 16:37:18 UTC; therneau", + "Author": "Terry M Therneau [aut, cre],\n Thomas Lumley [ctb, trl] (original S->R port and R maintainer until\n 2009),\n Atkinson Elizabeth [ctb],\n Crowson Cynthia [ctb]", + "Maintainer": "Terry M Therneau ", + "Repository": "RSPM", + "Date/Publication": "2024-12-17 20:20:02 UTC", + "Encoding": "UTF-8", + "Built": "R 4.4.0; x86_64-pc-linux-gnu; 2026-01-29 00:31:26 UTC; unix", + "RemotePkgRef": "survival@3.8-3", + "RemoteType": "standard", + "RemoteEtag": "\"db8f1ae037689db028aedc1a1d90d492-2\"", + "RemotePackaged": "TRUE", + "RemoteRef": "survival", + "RemoteRepos": "https://packagemanager.posit.co/cran/latest", + "RemotePkgPlatform": "source", + "RemoteSha": "3.8-3" + } + }, + "sys": { + "Source": "CRAN", + "Repository": "https://packagemanager.posit.co/cran/latest", + "description": { + "Package": "sys", + "Type": "Package", + "Title": "Powerful and Reliable Tools for Running System Commands in R", + "Version": "3.4.3", + "Authors@R": "c(person(\"Jeroen\", \"Ooms\", role = c(\"aut\", \"cre\"), \n email = \"jeroenooms@gmail.com\", comment = c(ORCID = \"0000-0002-4035-0289\")),\n person(\"Gábor\", \"Csárdi\", , \"csardi.gabor@gmail.com\", role = \"ctb\"))", + "Description": "Drop-in replacements for the base system2() function with fine control\n and consistent behavior across platforms. Supports clean interruption, timeout, \n background tasks, and streaming STDIN / STDOUT / STDERR over binary or text \n connections. Arguments on Windows automatically get encoded and quoted to work \n on different locales.", + "License": "MIT + file LICENSE", + "URL": "https://jeroen.r-universe.dev/sys", + "BugReports": "https://github.com/jeroen/sys/issues", + "Encoding": "UTF-8", + "RoxygenNote": "7.1.1", + "Suggests": "unix (>= 1.4), spelling, testthat", + "Language": "en-US", + "NeedsCompilation": "yes", + "Packaged": "2024-10-03 14:13:17 UTC; jeroen", + "Author": "Jeroen Ooms [aut, cre] (),\n Gábor Csárdi [ctb]", + "Maintainer": "Jeroen Ooms ", + "Repository": "RSPM", + "Date/Publication": "2024-10-04 09:40:02 UTC", + "Built": "R 4.4.0; x86_64-pc-linux-gnu; 2026-01-29 00:21:51 UTC; unix", + "RemoteType": "standard", + "RemotePkgRef": "sys", + "RemoteRef": "sys", + "RemoteRepos": "https://packagemanager.posit.co/cran/latest", + "RemotePkgPlatform": "source", + "RemoteSha": "3.4.3" + } + }, + "tibble": { + "Source": "CRAN", + "Repository": "https://packagemanager.posit.co/cran/latest", + "description": { + "Package": "tibble", + "Title": "Simple Data Frames", + "Version": "3.2.1", + "Authors@R": "\n c(person(given = \"Kirill\",\n family = \"M\\u00fcller\",\n role = c(\"aut\", \"cre\"),\n email = \"kirill@cynkra.com\",\n comment = c(ORCID = \"0000-0002-1416-3412\")),\n person(given = \"Hadley\",\n family = \"Wickham\",\n role = \"aut\",\n email = \"hadley@rstudio.com\"),\n person(given = \"Romain\",\n family = \"Francois\",\n role = \"ctb\",\n email = \"romain@r-enthusiasts.com\"),\n person(given = \"Jennifer\",\n family = \"Bryan\",\n role = \"ctb\",\n email = \"jenny@rstudio.com\"),\n person(given = \"RStudio\",\n role = c(\"cph\", \"fnd\")))", + "Description": "Provides a 'tbl_df' class (the 'tibble') with stricter checking and better formatting than the traditional\n data frame.", + "License": "MIT + file LICENSE", + "URL": "https://tibble.tidyverse.org/, https://github.com/tidyverse/tibble", + "BugReports": "https://github.com/tidyverse/tibble/issues", + "Depends": "R (>= 3.4.0)", + "Imports": "fansi (>= 0.4.0), lifecycle (>= 1.0.0), magrittr, methods,\npillar (>= 1.8.1), pkgconfig, rlang (>= 1.0.2), utils, vctrs\n(>= 0.4.2)", + "Suggests": "bench, bit64, blob, brio, callr, cli, covr, crayon (>=\n1.3.4), DiagrammeR, dplyr, evaluate, formattable, ggplot2,\nhere, hms, htmltools, knitr, lubridate, mockr, nycflights13,\npkgbuild, pkgload, purrr, rmarkdown, stringi, testthat (>=\n3.0.2), tidyr, withr", + "VignetteBuilder": "knitr", + "Encoding": "UTF-8", + "RoxygenNote": "7.2.3", + "Config/testthat/edition": "3", + "Config/testthat/parallel": "true", + "Config/testthat/start-first": "vignette-formats, as_tibble, add,\ninvariants", + "Config/autostyle/scope": "line_breaks", + "Config/autostyle/strict": "true", + "Config/autostyle/rmd": "false", + "Config/Needs/website": "tidyverse/tidytemplate", + "NeedsCompilation": "yes", + "Packaged": "2023-03-19 09:23:10 UTC; kirill", + "Author": "Kirill Müller [aut, cre] (),\n Hadley Wickham [aut],\n Romain Francois [ctb],\n Jennifer Bryan [ctb],\n RStudio [cph, fnd]", + "Maintainer": "Kirill Müller ", + "Repository": "RSPM", + "Date/Publication": "2023-03-20 06:30:02 UTC", + "Built": "R 4.4.0; x86_64-pc-linux-gnu; 2026-01-29 00:25:58 UTC; unix", + "RemotePkgRef": "tibble@3.2.1", + "RemoteType": "standard", + "RemoteEtag": "\"e579ca45af4ba2afb59f97316fd8c413\"", + "RemotePackaged": "TRUE", + "RemoteRef": "tibble", + "RemoteRepos": "https://packagemanager.posit.co/cran/latest", + "RemotePkgPlatform": "source", + "RemoteSha": "3.2.1" + } + }, + "tidyr": { + "Source": "CRAN", + "Repository": "https://packagemanager.posit.co/cran/latest", + "description": { + "Package": "tidyr", + "Title": "Tidy Messy Data", + "Version": "1.3.1", + "Authors@R": "c(\n person(\"Hadley\", \"Wickham\", , \"hadley@posit.co\", role = c(\"aut\", \"cre\")),\n person(\"Davis\", \"Vaughan\", , \"davis@posit.co\", role = \"aut\"),\n person(\"Maximilian\", \"Girlich\", role = \"aut\"),\n person(\"Kevin\", \"Ushey\", , \"kevin@posit.co\", role = \"ctb\"),\n person(\"Posit Software, PBC\", role = c(\"cph\", \"fnd\"))\n )", + "Description": "Tools to help to create tidy data, where each column is a\n variable, each row is an observation, and each cell contains a single\n value. 'tidyr' contains tools for changing the shape (pivoting) and\n hierarchy (nesting and 'unnesting') of a dataset, turning deeply\n nested lists into rectangular data frames ('rectangling'), and\n extracting values out of string columns. It also includes tools for\n working with missing values (both implicit and explicit).", + "License": "MIT + file LICENSE", + "URL": "https://tidyr.tidyverse.org, https://github.com/tidyverse/tidyr", + "BugReports": "https://github.com/tidyverse/tidyr/issues", + "Depends": "R (>= 3.6)", + "Imports": "cli (>= 3.4.1), dplyr (>= 1.0.10), glue, lifecycle (>= 1.0.3),\nmagrittr, purrr (>= 1.0.1), rlang (>= 1.1.1), stringr (>=\n1.5.0), tibble (>= 2.1.1), tidyselect (>= 1.2.0), utils, vctrs\n(>= 0.5.2)", + "Suggests": "covr, data.table, knitr, readr, repurrrsive (>= 1.1.0),\nrmarkdown, testthat (>= 3.0.0)", + "LinkingTo": "cpp11 (>= 0.4.0)", + "VignetteBuilder": "knitr", + "Config/Needs/website": "tidyverse/tidytemplate", + "Config/testthat/edition": "3", + "Encoding": "UTF-8", + "LazyData": "true", + "RoxygenNote": "7.3.0", + "NeedsCompilation": "yes", + "Packaged": "2024-01-23 14:27:23 UTC; hadleywickham", + "Author": "Hadley Wickham [aut, cre],\n Davis Vaughan [aut],\n Maximilian Girlich [aut],\n Kevin Ushey [ctb],\n Posit Software, PBC [cph, fnd]", + "Maintainer": "Hadley Wickham ", + "Repository": "RSPM", + "Date/Publication": "2024-01-24 14:50:09 UTC", + "Built": "R 4.4.0; x86_64-pc-linux-gnu; 2026-01-29 00:26:52 UTC; unix", + "RemotePkgRef": "tidyr@1.3.1", + "RemoteType": "standard", + "RemoteEtag": "\"1d0e26966c5d969b02fa7eb805ecc635\"", + "RemotePackaged": "TRUE", + "RemoteRef": "tidyr", + "RemoteRepos": "https://packagemanager.posit.co/cran/latest", + "RemotePkgPlatform": "source", + "RemoteSha": "1.3.1" + } + }, + "tidyselect": { + "Source": "CRAN", + "Repository": "https://packagemanager.posit.co/cran/latest", + "description": { + "Package": "tidyselect", + "Title": "Select from a Set of Strings", + "Version": "1.2.1", + "Authors@R": "c(\n person(\"Lionel\", \"Henry\", , \"lionel@posit.co\", role = c(\"aut\", \"cre\")),\n person(\"Hadley\", \"Wickham\", , \"hadley@posit.co\", role = \"aut\"),\n person(\"Posit Software, PBC\", role = c(\"cph\", \"fnd\"))\n )", + "Description": "A backend for the selecting functions of the 'tidyverse'. It\n makes it easy to implement select-like functions in your own packages\n in a way that is consistent with other 'tidyverse' interfaces for\n selection.", + "License": "MIT + file LICENSE", + "URL": "https://tidyselect.r-lib.org, https://github.com/r-lib/tidyselect", + "BugReports": "https://github.com/r-lib/tidyselect/issues", + "Depends": "R (>= 3.4)", + "Imports": "cli (>= 3.3.0), glue (>= 1.3.0), lifecycle (>= 1.0.3), rlang\n(>= 1.0.4), vctrs (>= 0.5.2), withr", + "Suggests": "covr, crayon, dplyr, knitr, magrittr, rmarkdown, stringr,\ntestthat (>= 3.1.1), tibble (>= 2.1.3)", + "VignetteBuilder": "knitr", + "ByteCompile": "true", + "Config/testthat/edition": "3", + "Config/Needs/website": "tidyverse/tidytemplate", + "Encoding": "UTF-8", + "RoxygenNote": "7.3.0.9000", + "NeedsCompilation": "yes", + "Packaged": "2024-03-11 11:46:04 UTC; lionel", + "Author": "Lionel Henry [aut, cre],\n Hadley Wickham [aut],\n Posit Software, PBC [cph, fnd]", + "Maintainer": "Lionel Henry ", + "Repository": "RSPM", + "Date/Publication": "2024-03-11 14:10:02 UTC", + "Built": "R 4.4.0; ; 2026-01-29 00:25:44 UTC; unix", + "RemoteType": "standard", + "RemotePkgRef": "tidyselect", + "RemoteRef": "tidyselect", + "RemoteRepos": "https://packagemanager.posit.co/cran/latest", + "RemotePkgPlatform": "source", + "RemoteSha": "1.2.1" + } + }, + "timevis": { + "Source": "CRAN", + "Repository": "https://packagemanager.posit.co/cran/latest", + "description": { + "Package": "timevis", + "Title": "Create Interactive Timeline Visualizations in R", + "Version": "2.1.0", + "Authors@R": "c(\n person(\"Dean\", \"Attali\", email = \"daattali@gmail.com\",\n role = c(\"aut\", \"cre\"), comment = c(\"R interface\", ORCID=\"0000-0002-5645-3493\")),\n person(family = \"Almende B.V.\", role = c(\"aut\", \"cph\"),\n comment = \"vis.js Timeline library, https://visjs.github.io/vis-timeline/docs/timeline/\")\n )", + "Description": "Create rich and fully interactive timeline visualizations.\n Timelines can be included in Shiny apps or R markdown documents.\n 'timevis' includes an extensive API to manipulate a timeline after creation,\n and supports getting data out of the visualization into R. Based on the\n 'vis.js' Timeline JavaScript library.", + "URL": "https://github.com/daattali/timevis", + "BugReports": "https://github.com/daattali/timevis/issues", + "Depends": "R (>= 3.1.0)", + "Imports": "htmltools (>= 0.2.6), htmlwidgets (>= 0.6), jsonlite,\nmagrittr, methods, rmarkdown, shiny", + "Suggests": "lubridate, testthat (>= 0.9.1), shinydisconnect", + "License": "MIT + file LICENSE", + "Encoding": "UTF-8", + "LazyData": "true", + "RoxygenNote": "7.2.1", + "NeedsCompilation": "no", + "Packaged": "2022-10-28 07:15:03 UTC; Dean-X1C", + "Author": "Dean Attali [aut, cre] (R interface,\n ),\n Almende B.V. [aut, cph] (vis.js Timeline library,\n https://visjs.github.io/vis-timeline/docs/timeline/)", + "Maintainer": "Dean Attali ", + "Repository": "RSPM", + "Date/Publication": "2022-11-03 08:30:02 UTC", + "Built": "R 4.4.0; ; 2026-01-29 00:30:30 UTC; unix", + "RemotePkgRef": "timevis@2.1.0", + "RemoteType": "standard", + "RemoteEtag": "\"0fc7a0b8c1ce15235ccbe51088bfd456\"", + "RemotePackaged": "TRUE", + "RemoteRef": "timevis", + "RemoteRepos": "https://packagemanager.posit.co/cran/latest", + "RemotePkgPlatform": "source", + "RemoteSha": "2.1.0" + } + }, + "tinytex": { + "Source": "CRAN", + "Repository": "https://packagemanager.posit.co/cran/latest", + "description": { + "Package": "tinytex", + "Type": "Package", + "Title": "Helper Functions to Install and Maintain TeX Live, and Compile\nLaTeX Documents", + "Version": "0.56", + "Authors@R": "c(\n person(\"Yihui\", \"Xie\", role = c(\"aut\", \"cre\", \"cph\"), email = \"xie@yihui.name\", comment = c(ORCID = \"0000-0003-0645-5666\")),\n person(given = \"Posit Software, PBC\", role = c(\"cph\", \"fnd\")),\n person(\"Christophe\", \"Dervieux\", role = \"ctb\", comment = c(ORCID = \"0000-0003-4474-2498\")),\n person(\"Devon\", \"Ryan\", role = \"ctb\", email = \"dpryan79@gmail.com\", comment = c(ORCID = \"0000-0002-8549-0971\")),\n person(\"Ethan\", \"Heinzen\", role = \"ctb\"),\n person(\"Fernando\", \"Cagua\", role = \"ctb\"),\n person()\n )", + "Description": "Helper functions to install and maintain the 'LaTeX' distribution\n named 'TinyTeX' (), a lightweight, cross-platform,\n portable, and easy-to-maintain version of 'TeX Live'. This package also\n contains helper functions to compile 'LaTeX' documents, and install missing\n 'LaTeX' packages automatically.", + "Imports": "xfun (>= 0.48)", + "Suggests": "testit, rstudioapi", + "License": "MIT + file LICENSE", + "URL": "https://github.com/rstudio/tinytex", + "BugReports": "https://github.com/rstudio/tinytex/issues", + "Encoding": "UTF-8", + "RoxygenNote": "7.3.2", + "NeedsCompilation": "no", + "Packaged": "2025-02-26 22:02:14 UTC; runner", + "Author": "Yihui Xie [aut, cre, cph] (),\n Posit Software, PBC [cph, fnd],\n Christophe Dervieux [ctb] (),\n Devon Ryan [ctb] (),\n Ethan Heinzen [ctb],\n Fernando Cagua [ctb]", + "Maintainer": "Yihui Xie ", + "Repository": "RSPM", + "Date/Publication": "2025-02-26 22:50:02 UTC", + "Built": "R 4.4.0; ; 2026-01-29 00:23:17 UTC; unix", + "RemotePkgRef": "tinytex@0.56", + "RemoteType": "standard", + "RemoteEtag": "\"00f82b9c20a5f8d6a0bc9f1ca6f46107\"", + "RemotePackaged": "TRUE", + "RemoteRef": "tinytex", + "RemoteRepos": "https://packagemanager.posit.co/cran/latest", + "RemotePkgPlatform": "source", + "RemoteSha": "0.56" + } + }, + "tippy": { + "Source": "CRAN", + "Repository": "https://packagemanager.posit.co/cran/latest", + "description": { + "Package": "tippy", + "Title": "Add Tooltips to 'R markdown' Documents or 'Shiny' Apps", + "Version": "0.1.0", + "Authors@R": "person(\"John\", \"Coene\", email = \"jcoenep@gmail.com\", role = c(\"aut\", \"cre\"))", + "Description": "'Htmlwidget' of 'Tippyjs' to add tooltips to 'Shiny' apps and 'R markdown' documents.", + "Depends": "R (>= 3.4.0)", + "License": "MIT + file LICENSE", + "Encoding": "UTF-8", + "LazyData": "true", + "Imports": "htmlwidgets, htmltools, shiny, jsonlite", + "RoxygenNote": "7.1.1", + "URL": "https://tippy.john-coene.com/", + "BugReports": "https://github.com/JohnCoene/tippy/issues", + "NeedsCompilation": "no", + "Packaged": "2021-01-11 20:42:47 UTC; jp", + "Author": "John Coene [aut, cre]", + "Maintainer": "John Coene ", + "Repository": "RSPM", + "Date/Publication": "2021-01-11 21:10:02 UTC", + "Built": "R 4.4.0; ; 2026-01-29 00:30:26 UTC; unix", + "RemotePkgRef": "tippy@0.1.0", + "RemoteType": "standard", + "RemoteEtag": "\"43102545aa0212350f5a3cb1a05d6331\"", + "RemotePackaged": "TRUE", + "RemoteRef": "tippy", + "RemoteRepos": "https://packagemanager.posit.co/cran/latest", + "RemotePkgPlatform": "source", + "RemoteSha": "0.1.0" + } + }, + "tzdb": { + "Source": "CRAN", + "Repository": "https://packagemanager.posit.co/cran/latest", + "description": { + "Package": "tzdb", + "Title": "Time Zone Database Information", + "Version": "0.4.0", + "Authors@R": "c(\n person(\"Davis\", \"Vaughan\", , \"davis@posit.co\", role = c(\"aut\", \"cre\")),\n person(\"Howard\", \"Hinnant\", role = \"cph\",\n comment = \"Author of the included date library\"),\n person(\"Posit Software, PBC\", role = c(\"cph\", \"fnd\"))\n )", + "Description": "Provides an up-to-date copy of the Internet Assigned Numbers\n Authority (IANA) Time Zone Database. It is updated periodically to\n reflect changes made by political bodies to time zone boundaries, UTC\n offsets, and daylight saving time rules. Additionally, this package\n provides a C++ interface for working with the 'date' library. 'date'\n provides comprehensive support for working with dates and date-times,\n which this package exposes to make it easier for other R packages to\n utilize. Headers are provided for calendar specific calculations,\n along with a limited interface for time zone manipulations.", + "License": "MIT + file LICENSE", + "URL": "https://tzdb.r-lib.org, https://github.com/r-lib/tzdb", + "BugReports": "https://github.com/r-lib/tzdb/issues", + "Depends": "R (>= 3.5.0)", + "Suggests": "covr, testthat (>= 3.0.0)", + "LinkingTo": "cpp11 (>= 0.4.2)", + "Biarch": "yes", + "Config/Needs/website": "tidyverse/tidytemplate", + "Config/testthat/edition": "3", + "Encoding": "UTF-8", + "RoxygenNote": "7.2.3", + "NeedsCompilation": "yes", + "Packaged": "2023-05-12 12:40:06 UTC; davis", + "Author": "Davis Vaughan [aut, cre],\n Howard Hinnant [cph] (Author of the included date library),\n Posit Software, PBC [cph, fnd]", + "Maintainer": "Davis Vaughan ", + "Repository": "RSPM", + "Date/Publication": "2023-05-12 23:00:02 UTC", + "Built": "R 4.4.0; x86_64-pc-linux-gnu; 2026-01-29 00:23:22 UTC; unix", + "RemotePkgRef": "tzdb@0.4.0", + "RemoteType": "standard", + "RemoteEtag": "\"fd127afd666d6d8cf13de97382d55eaf\"", + "RemotePackaged": "TRUE", + "RemoteRef": "tzdb", + "RemoteRepos": "https://packagemanager.posit.co/cran/latest", + "RemotePkgPlatform": "source", + "RemoteSha": "0.4.0" + } + }, + "utf8": { + "Source": "CRAN", + "Repository": "https://packagemanager.posit.co/cran/latest", + "description": { + "Package": "utf8", + "Title": "Unicode Text Processing", + "Version": "1.2.4", + "Authors@R": "\n c(person(given = c(\"Patrick\", \"O.\"),\n family = \"Perry\",\n role = c(\"aut\", \"cph\")),\n person(given = \"Kirill\",\n family = \"M\\u00fcller\",\n role = \"cre\",\n email = \"kirill@cynkra.com\"),\n person(given = \"Unicode, Inc.\",\n role = c(\"cph\", \"dtc\"),\n comment = \"Unicode Character Database\"))", + "Description": "Process and print 'UTF-8' encoded international\n text (Unicode). Input, validate, normalize, encode, format, and\n display.", + "License": "Apache License (== 2.0) | file LICENSE", + "URL": "https://ptrckprry.com/r-utf8/, https://github.com/patperry/r-utf8", + "BugReports": "https://github.com/patperry/r-utf8/issues", + "Depends": "R (>= 2.10)", + "Suggests": "cli, covr, knitr, rlang, rmarkdown, testthat (>= 3.0.0),\nwithr", + "VignetteBuilder": "knitr, rmarkdown", + "Config/testthat/edition": "3", + "Encoding": "UTF-8", + "RoxygenNote": "7.2.3", + "NeedsCompilation": "yes", + "Packaged": "2023-10-22 13:43:19 UTC; kirill", + "Author": "Patrick O. Perry [aut, cph],\n Kirill Müller [cre],\n Unicode, Inc. [cph, dtc] (Unicode Character Database)", + "Maintainer": "Kirill Müller ", + "Repository": "RSPM", + "Date/Publication": "2023-10-22 21:50:02 UTC", + "Built": "R 4.4.0; x86_64-pc-linux-gnu; 2026-01-29 00:21:46 UTC; unix", + "RemotePkgRef": "utf8@1.2.4", + "RemoteType": "standard", + "RemoteEtag": "\"3b9e8153bce1c6532fe292755729fc00\"", + "RemotePackaged": "TRUE", + "RemoteRef": "utf8", + "RemoteRepos": "https://packagemanager.posit.co/cran/latest", + "RemotePkgPlatform": "source", + "RemoteSha": "1.2.4" + } + }, + "vctrs": { + "Source": "CRAN", + "Repository": "https://packagemanager.posit.co/cran/latest", + "description": { + "Package": "vctrs", + "Title": "Vector Helpers", + "Version": "0.6.5", + "Authors@R": "c(\n person(\"Hadley\", \"Wickham\", , \"hadley@posit.co\", role = \"aut\"),\n person(\"Lionel\", \"Henry\", , \"lionel@posit.co\", role = \"aut\"),\n person(\"Davis\", \"Vaughan\", , \"davis@posit.co\", role = c(\"aut\", \"cre\")),\n person(\"data.table team\", role = \"cph\",\n comment = \"Radix sort based on data.table's forder() and their contribution to R's order()\"),\n person(\"Posit Software, PBC\", role = c(\"cph\", \"fnd\"))\n )", + "Description": "Defines new notions of prototype and size that are used to\n provide tools for consistent and well-founded type-coercion and\n size-recycling, and are in turn connected to ideas of type- and\n size-stability useful for analysing function interfaces.", + "License": "MIT + file LICENSE", + "URL": "https://vctrs.r-lib.org/, https://github.com/r-lib/vctrs", + "BugReports": "https://github.com/r-lib/vctrs/issues", + "Depends": "R (>= 3.5.0)", + "Imports": "cli (>= 3.4.0), glue, lifecycle (>= 1.0.3), rlang (>= 1.1.0)", + "Suggests": "bit64, covr, crayon, dplyr (>= 0.8.5), generics, knitr,\npillar (>= 1.4.4), pkgdown (>= 2.0.1), rmarkdown, testthat (>=\n3.0.0), tibble (>= 3.1.3), waldo (>= 0.2.0), withr, xml2,\nzeallot", + "VignetteBuilder": "knitr", + "Config/Needs/website": "tidyverse/tidytemplate", + "Config/testthat/edition": "3", + "Encoding": "UTF-8", + "Language": "en-GB", + "RoxygenNote": "7.2.3", + "NeedsCompilation": "yes", + "Packaged": "2023-12-01 16:27:12 UTC; davis", + "Author": "Hadley Wickham [aut],\n Lionel Henry [aut],\n Davis Vaughan [aut, cre],\n data.table team [cph] (Radix sort based on data.table's forder() and\n their contribution to R's order()),\n Posit Software, PBC [cph, fnd]", + "Maintainer": "Davis Vaughan ", + "Repository": "RSPM", + "Date/Publication": "2023-12-01 23:50:02 UTC", + "Built": "R 4.4.0; x86_64-pc-linux-gnu; 2026-01-29 00:24:25 UTC; unix", + "RemotePkgRef": "vctrs@0.6.5", + "RemoteType": "standard", + "RemoteEtag": "\"310ccbec154c2f2385d7bb41bb535e79\"", + "RemotePackaged": "TRUE", + "RemoteRef": "vctrs", + "RemoteRepos": "https://packagemanager.posit.co/cran/latest", + "RemotePkgPlatform": "source", + "RemoteSha": "0.6.5" + } + }, + "viridisLite": { + "Source": "CRAN", + "Repository": "https://packagemanager.posit.co/cran/latest", + "description": { + "Package": "viridisLite", + "Type": "Package", + "Title": "Colorblind-Friendly Color Maps (Lite Version)", + "Version": "0.4.2", + "Date": "2023-05-02", + "Authors@R": "c(\n person(\"Simon\", \"Garnier\", email = \"garnier@njit.edu\", role = c(\"aut\", \"cre\")),\n person(\"Noam\", \"Ross\", email = \"noam.ross@gmail.com\", role = c(\"ctb\", \"cph\")),\n person(\"Bob\", \"Rudis\", email = \"bob@rud.is\", role = c(\"ctb\", \"cph\")),\n person(\"Marco\", \"Sciaini\", email = \"sciaini.marco@gmail.com\", role = c(\"ctb\", \"cph\")),\n person(\"Antônio Pedro\", \"Camargo\", role = c(\"ctb\", \"cph\")),\n person(\"Cédric\", \"Scherer\", email = \"scherer@izw-berlin.de\", role = c(\"ctb\", \"cph\"))\n )", + "Maintainer": "Simon Garnier ", + "Description": "Color maps designed to improve graph readability for readers with \n common forms of color blindness and/or color vision deficiency. The color \n maps are also perceptually-uniform, both in regular form and also when \n converted to black-and-white for printing. This is the 'lite' version of the \n 'viridis' package that also contains 'ggplot2' bindings for discrete and \n continuous color and fill scales and can be found at \n .", + "License": "MIT + file LICENSE", + "Encoding": "UTF-8", + "Depends": "R (>= 2.10)", + "Suggests": "hexbin (>= 1.27.0), ggplot2 (>= 1.0.1), testthat, covr", + "URL": "https://sjmgarnier.github.io/viridisLite/,\nhttps://github.com/sjmgarnier/viridisLite/", + "BugReports": "https://github.com/sjmgarnier/viridisLite/issues/", + "RoxygenNote": "7.2.3", + "NeedsCompilation": "no", + "Packaged": "2023-05-02 21:38:46 UTC; simon", + "Author": "Simon Garnier [aut, cre],\n Noam Ross [ctb, cph],\n Bob Rudis [ctb, cph],\n Marco Sciaini [ctb, cph],\n Antônio Pedro Camargo [ctb, cph],\n Cédric Scherer [ctb, cph]", + "Repository": "RSPM", + "Date/Publication": "2023-05-02 23:50:02 UTC", + "Built": "R 4.4.0; ; 2026-01-29 00:21:19 UTC; unix", + "RemoteType": "standard", + "RemotePkgRef": "viridisLite", + "RemoteRef": "viridisLite", + "RemoteRepos": "https://packagemanager.posit.co/cran/latest", + "RemotePkgPlatform": "source", + "RemoteSha": "0.4.2" + } + }, + "vroom": { + "Source": "CRAN", + "Repository": "https://packagemanager.posit.co/cran/latest", + "description": { + "Package": "vroom", + "Title": "Read and Write Rectangular Text Data Quickly", + "Version": "1.6.5", + "Authors@R": "c(\n person(\"Jim\", \"Hester\", role = \"aut\",\n comment = c(ORCID = \"0000-0002-2739-7082\")),\n person(\"Hadley\", \"Wickham\", , \"hadley@posit.co\", role = \"aut\",\n comment = c(ORCID = \"0000-0003-4757-117X\")),\n person(\"Jennifer\", \"Bryan\", , \"jenny@posit.co\", role = c(\"aut\", \"cre\"),\n comment = c(ORCID = \"0000-0002-6983-2759\")),\n person(\"Shelby\", \"Bearrows\", role = \"ctb\"),\n person(\"https://github.com/mandreyel/\", role = \"cph\",\n comment = \"mio library\"),\n person(\"Jukka\", \"Jylänki\", role = \"cph\",\n comment = \"grisu3 implementation\"),\n person(\"Mikkel\", \"Jørgensen\", role = \"cph\",\n comment = \"grisu3 implementation\"),\n person(\"Posit Software, PBC\", role = c(\"cph\", \"fnd\"))\n )", + "Description": "The goal of 'vroom' is to read and write data (like 'csv',\n 'tsv' and 'fwf') quickly. When reading it uses a quick initial\n indexing step, then reads the values lazily , so only the data you\n actually use needs to be read. The writer formats the data in\n 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)", + "Imports": "bit64, cli (>= 3.2.0), crayon, glue, hms, lifecycle (>=\n1.0.3), methods, rlang (>= 0.4.2), stats, tibble (>= 2.0.0),\ntidyselect, tzdb (>= 0.1.1), vctrs (>= 0.2.0), withr", + "Suggests": "archive, bench (>= 1.1.0), covr, curl, dplyr, forcats, fs,\nggplot2, knitr, patchwork, prettyunits, purrr, rmarkdown,\nrstudioapi, scales, spelling, testthat (>= 2.1.0), tidyr,\nutils, waldo, xml2", + "LinkingTo": "cpp11 (>= 0.2.0), progress (>= 1.2.1), tzdb (>= 0.1.1)", + "VignetteBuilder": "knitr", + "Config/Needs/website": "nycflights13, tidyverse/tidytemplate", + "Config/testthat/edition": "3", + "Config/testthat/parallel": "false", + "Copyright": "file COPYRIGHTS", + "Encoding": "UTF-8", + "Language": "en-US", + "RoxygenNote": "7.2.3.9000", + "NeedsCompilation": "yes", + "Packaged": "2023-12-05 16:46:59 UTC; jenny", + "Author": "Jim Hester [aut] (),\n Hadley Wickham [aut] (),\n Jennifer Bryan [aut, cre] (),\n Shelby Bearrows [ctb],\n https://github.com/mandreyel/ [cph] (mio library),\n Jukka Jylänki [cph] (grisu3 implementation),\n Mikkel Jørgensen [cph] (grisu3 implementation),\n Posit Software, PBC [cph, fnd]", + "Maintainer": "Jennifer Bryan ", + "Repository": "RSPM", + "Date/Publication": "2023-12-05 23:50:02 UTC", + "Built": "R 4.4.0; x86_64-pc-linux-gnu; 2026-01-29 00:26:14 UTC; unix", + "RemotePkgRef": "vroom@1.6.5", + "RemoteType": "standard", + "RemoteEtag": "\"2ff39f8920bf5684a5490aeaab984236\"", + "RemotePackaged": "TRUE", + "RemoteRef": "vroom", + "RemoteRepos": "https://packagemanager.posit.co/cran/latest", + "RemotePkgPlatform": "source", + "RemoteSha": "1.6.5" + } + }, + "withr": { + "Source": "CRAN", + "Repository": "https://packagemanager.posit.co/cran/latest", + "description": { + "Package": "withr", + "Title": "Run Code 'With' Temporarily Modified Global State", + "Version": "3.0.2", + "Authors@R": "c(\n person(\"Jim\", \"Hester\", role = \"aut\"),\n person(\"Lionel\", \"Henry\", , \"lionel@posit.co\", role = c(\"aut\", \"cre\")),\n person(\"Kirill\", \"Müller\", , \"krlmlr+r@mailbox.org\", role = \"aut\"),\n person(\"Kevin\", \"Ushey\", , \"kevinushey@gmail.com\", role = \"aut\"),\n person(\"Hadley\", \"Wickham\", , \"hadley@posit.co\", role = \"aut\"),\n person(\"Winston\", \"Chang\", role = \"aut\"),\n person(\"Jennifer\", \"Bryan\", role = \"ctb\"),\n person(\"Richard\", \"Cotton\", role = \"ctb\"),\n person(\"Posit Software, PBC\", role = c(\"cph\", \"fnd\"))\n )", + "Description": "A set of functions to run code 'with' safely and temporarily\n modified global state. Many of these functions were originally a part\n of the 'devtools' package, this provides a simple package with limited\n dependencies to provide access to these functions.", + "License": "MIT + file LICENSE", + "URL": "https://withr.r-lib.org, https://github.com/r-lib/withr#readme", + "BugReports": "https://github.com/r-lib/withr/issues", + "Depends": "R (>= 3.6.0)", + "Imports": "graphics, grDevices", + "Suggests": "callr, DBI, knitr, methods, rlang, rmarkdown (>= 2.12),\nRSQLite, testthat (>= 3.0.0)", + "VignetteBuilder": "knitr", + "Config/Needs/website": "tidyverse/tidytemplate", + "Config/testthat/edition": "3", + "Encoding": "UTF-8", + "RoxygenNote": "7.3.2", + "Collate": "'aaa.R' 'collate.R' 'connection.R' 'db.R' 'defer-exit.R'\n'standalone-defer.R' 'defer.R' 'devices.R' 'local_.R' 'with_.R'\n'dir.R' 'env.R' 'file.R' 'language.R' 'libpaths.R' 'locale.R'\n'makevars.R' 'namespace.R' 'options.R' 'par.R' 'path.R' 'rng.R'\n'seed.R' 'wrap.R' 'sink.R' 'tempfile.R' 'timezone.R'\n'torture.R' 'utils.R' 'with.R'", + "NeedsCompilation": "no", + "Packaged": "2024-10-28 10:58:18 UTC; lionel", + "Author": "Jim Hester [aut],\n Lionel Henry [aut, cre],\n Kirill Müller [aut],\n Kevin Ushey [aut],\n Hadley Wickham [aut],\n Winston Chang [aut],\n Jennifer Bryan [ctb],\n Richard Cotton [ctb],\n Posit Software, PBC [cph, fnd]", + "Maintainer": "Lionel Henry ", + "Repository": "RSPM", + "Date/Publication": "2024-10-28 13:30:02 UTC", + "Built": "R 4.4.0; ; 2026-01-29 00:21:11 UTC; unix", + "RemoteType": "standard", + "RemotePkgRef": "withr", + "RemoteRef": "withr", + "RemoteRepos": "https://packagemanager.posit.co/cran/latest", + "RemotePkgPlatform": "source", + "RemoteSha": "3.0.2" + } + }, + "xfun": { + "Source": "CRAN", + "Repository": "https://packagemanager.posit.co/cran/latest", + "description": { + "Package": "xfun", + "Type": "Package", + "Title": "Supporting Functions for Packages Maintained by 'Yihui Xie'", + "Version": "0.52", + "Authors@R": "c(\n person(\"Yihui\", \"Xie\", role = c(\"aut\", \"cre\", \"cph\"), email = \"xie@yihui.name\", comment = c(ORCID = \"0000-0003-0645-5666\", URL = \"https://yihui.org\")),\n person(\"Wush\", \"Wu\", role = \"ctb\"),\n person(\"Daijiang\", \"Li\", role = \"ctb\"),\n person(\"Xianying\", \"Tan\", role = \"ctb\"),\n person(\"Salim\", \"Brüggemann\", role = \"ctb\", email = \"salim-b@pm.me\", comment = c(ORCID = \"0000-0002-5329-5987\")),\n person(\"Christophe\", \"Dervieux\", role = \"ctb\"),\n person()\n )", + "Description": "Miscellaneous functions commonly used in other packages maintained by 'Yihui Xie'.", + "Depends": "R (>= 3.2.0)", + "Imports": "grDevices, stats, tools", + "Suggests": "testit, parallel, codetools, methods, rstudioapi, tinytex (>=\n0.30), mime, litedown (>= 0.4), commonmark, knitr (>= 1.50),\nremotes, pak, curl, xml2, jsonlite, magick, yaml, 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", + "VignetteBuilder": "litedown", + "NeedsCompilation": "yes", + "Packaged": "2025-04-02 19:53:53 UTC; runner", + "Author": "Yihui Xie [aut, cre, cph] (,\n https://yihui.org),\n Wush Wu [ctb],\n Daijiang Li [ctb],\n Xianying Tan [ctb],\n Salim Brüggemann [ctb] (),\n Christophe Dervieux [ctb]", + "Maintainer": "Yihui Xie ", + "Repository": "RSPM", + "Date/Publication": "2025-04-02 20:40:02 UTC", + "Built": "R 4.4.0; x86_64-pc-linux-gnu; 2026-01-29 00:21:47 UTC; unix", + "RemotePkgRef": "xfun@0.52", + "RemoteType": "standard", + "RemoteEtag": "\"3580f3ac8ed8088d1760e869054f7ca3\"", + "RemotePackaged": "TRUE", + "RemoteRef": "xfun", + "RemoteRepos": "https://packagemanager.posit.co/cran/latest", + "RemotePkgPlatform": "source", + "RemoteSha": "0.52" + } + }, + "xml2": { + "Source": "CRAN", + "Repository": "https://packagemanager.posit.co/cran/latest", + "description": { + "Package": "xml2", + "Title": "Parse XML", + "Version": "1.3.8", + "Authors@R": "c(\n person(\"Hadley\", \"Wickham\", role = \"aut\"),\n person(\"Jim\", \"Hester\", role = \"aut\"),\n person(\"Jeroen\", \"Ooms\", email = \"jeroenooms@gmail.com\", role = c(\"aut\", \"cre\")),\n person(\"Posit Software, PBC\", role = c(\"cph\", \"fnd\")),\n person(\"R Foundation\", role = \"ctb\",\n comment = \"Copy of R-project homepage cached as example\")\n )", + "Description": "Bindings to 'libxml2' for working with XML data using a simple, \n consistent interface based on 'XPath' expressions. Also supports XML schema\n validation; for 'XSLT' transformations see the 'xslt' package.", + "License": "MIT + file LICENSE", + "URL": "https://xml2.r-lib.org, https://r-lib.r-universe.dev/xml2", + "BugReports": "https://github.com/r-lib/xml2/issues", + "Depends": "R (>= 3.6.0)", + "Imports": "cli, methods, rlang (>= 1.1.0)", + "Suggests": "covr, curl, httr, knitr, magrittr, mockery, rmarkdown,\ntestthat (>= 3.2.0), xslt", + "VignetteBuilder": "knitr", + "Config/Needs/website": "tidyverse/tidytemplate", + "Encoding": "UTF-8", + "RoxygenNote": "7.2.3", + "SystemRequirements": "libxml2: libxml2-dev (deb), libxml2-devel (rpm)", + "Collate": "'S4.R' 'as_list.R' 'xml_parse.R' 'as_xml_document.R'\n'classes.R' 'format.R' 'import-standalone-obj-type.R'\n'import-standalone-purrr.R' 'import-standalone-types-check.R'\n'init.R' 'nodeset_apply.R' 'paths.R' 'utils.R' 'xml2-package.R'\n'xml_attr.R' 'xml_children.R' 'xml_document.R' 'xml_find.R'\n'xml_missing.R' 'xml_modify.R' 'xml_name.R' 'xml_namespaces.R'\n'xml_node.R' 'xml_nodeset.R' 'xml_path.R' 'xml_schema.R'\n'xml_serialize.R' 'xml_structure.R' 'xml_text.R' 'xml_type.R'\n'xml_url.R' 'xml_write.R' 'zzz.R'", + "Config/testthat/edition": "3", + "NeedsCompilation": "yes", + "Packaged": "2025-03-14 14:37:00 UTC; jeroen", + "Author": "Hadley Wickham [aut],\n Jim Hester [aut],\n Jeroen Ooms [aut, cre],\n Posit Software, PBC [cph, fnd],\n R Foundation [ctb] (Copy of R-project homepage cached as example)", + "Maintainer": "Jeroen Ooms ", + "Repository": "RSPM", + "Date/Publication": "2025-03-14 19:30:02 UTC", + "Built": "R 4.4.0; x86_64-pc-linux-gnu; 2026-01-29 00:24:13 UTC; unix", + "RemotePkgRef": "xml2@1.3.8", + "RemoteType": "standard", + "RemoteEtag": "\"c8c5818be3bb4fc3c2311553cd707118\"", + "RemotePackaged": "TRUE", + "RemoteRef": "xml2", + "RemoteRepos": "https://packagemanager.posit.co/cran/latest", + "RemotePkgPlatform": "source", + "RemoteSha": "1.3.8" + } + }, + "xtable": { + "Source": "CRAN", + "Repository": "https://packagemanager.posit.co/cran/latest", + "description": { + "Package": "xtable", + "Version": "1.8-4", + "Date": "2019-04-08", + "Title": "Export Tables to LaTeX or HTML", + "Authors@R": "c(person(\"David B.\", \"Dahl\", role=\"aut\"),\n person(\"David\", \"Scott\", role=c(\"aut\",\"cre\"),\n email=\"d.scott@auckland.ac.nz\"),\n person(\"Charles\", \"Roosen\", role=\"aut\"),\n person(\"Arni\", \"Magnusson\", role=\"aut\"),\n person(\"Jonathan\", \"Swinton\", role=\"aut\"),\n person(\"Ajay\", \"Shah\", role=\"ctb\"),\n person(\"Arne\", \"Henningsen\", role=\"ctb\"),\n person(\"Benno\", \"Puetz\", role=\"ctb\"),\n person(\"Bernhard\", \"Pfaff\", role=\"ctb\"),\n person(\"Claudio\", \"Agostinelli\", role=\"ctb\"),\n person(\"Claudius\", \"Loehnert\", role=\"ctb\"),\n person(\"David\", \"Mitchell\", role=\"ctb\"),\n person(\"David\", \"Whiting\", role=\"ctb\"),\n person(\"Fernando da\", \"Rosa\", role=\"ctb\"),\n person(\"Guido\", \"Gay\", role=\"ctb\"),\n person(\"Guido\", \"Schulz\", role=\"ctb\"),\n person(\"Ian\", \"Fellows\", role=\"ctb\"),\n person(\"Jeff\", \"Laake\", role=\"ctb\"),\n person(\"John\", \"Walker\", role=\"ctb\"),\n person(\"Jun\", \"Yan\", role=\"ctb\"),\n person(\"Liviu\", \"Andronic\", role=\"ctb\"),\n person(\"Markus\", \"Loecher\", role=\"ctb\"),\n person(\"Martin\", \"Gubri\", role=\"ctb\"),\n person(\"Matthieu\", \"Stigler\", role=\"ctb\"),\n person(\"Robert\", \"Castelo\", role=\"ctb\"),\n person(\"Seth\", \"Falcon\", role=\"ctb\"),\n person(\"Stefan\", \"Edwards\", role=\"ctb\"),\n person(\"Sven\", \"Garbade\", role=\"ctb\"),\n person(\"Uwe\", \"Ligges\", role=\"ctb\"))", + "Maintainer": "David Scott ", + "Imports": "stats, utils", + "Suggests": "knitr, plm, zoo, survival", + "VignetteBuilder": "knitr", + "Description": "Coerce data to LaTeX and HTML tables.", + "URL": "http://xtable.r-forge.r-project.org/", + "Depends": "R (>= 2.10.0)", + "License": "GPL (>= 2)", + "Repository": "RSPM", + "NeedsCompilation": "no", + "Packaged": "2019-04-21 10:56:51 UTC; dsco036", + "Author": "David B. Dahl [aut],\n David Scott [aut, cre],\n Charles Roosen [aut],\n Arni Magnusson [aut],\n Jonathan Swinton [aut],\n Ajay Shah [ctb],\n Arne Henningsen [ctb],\n Benno Puetz [ctb],\n Bernhard Pfaff [ctb],\n Claudio Agostinelli [ctb],\n Claudius Loehnert [ctb],\n David Mitchell [ctb],\n David Whiting [ctb],\n Fernando da Rosa [ctb],\n Guido Gay [ctb],\n Guido Schulz [ctb],\n Ian Fellows [ctb],\n Jeff Laake [ctb],\n John Walker [ctb],\n Jun Yan [ctb],\n Liviu Andronic [ctb],\n Markus Loecher [ctb],\n Martin Gubri [ctb],\n Matthieu Stigler [ctb],\n Robert Castelo [ctb],\n Seth Falcon [ctb],\n Stefan Edwards [ctb],\n Sven Garbade [ctb],\n Uwe Ligges [ctb]", + "Date/Publication": "2019-04-21 12:20:03 UTC", + "Encoding": "UTF-8", + "Built": "R 4.4.0; ; 2026-01-29 00:21:13 UTC; unix", + "RemoteType": "standard", + "RemotePkgRef": "xtable", + "RemoteRef": "xtable", + "RemoteRepos": "https://packagemanager.posit.co/cran/latest", + "RemotePkgPlatform": "source", + "RemoteSha": "1.8-4" + } + }, + "yaml": { + "Source": "CRAN", + "Repository": "https://packagemanager.posit.co/cran/latest", + "description": { + "Package": "yaml", + "Type": "Package", + "Title": "Methods to Convert R Data to YAML and Back", + "Date": "2024-07-22", + "Version": "2.3.10", + "Suggests": "RUnit", + "Author": "Shawn P Garbett [aut], Jeremy Stephens [aut, cre], Kirill Simonov [aut], Yihui Xie [ctb],\n Zhuoer Dong [ctb], Hadley Wickham [ctb], Jeffrey Horner [ctb], reikoch [ctb],\n Will Beasley [ctb], Brendan O'Connor [ctb], Gregory R. Warnes [ctb],\n Michael Quinn [ctb], Zhian N. Kamvar [ctb], Charlie Gao [ctb]", + "Maintainer": "Shawn Garbett ", + "License": "BSD_3_clause + file LICENSE", + "Description": "Implements the 'libyaml' 'YAML' 1.1 parser and emitter\n () for R.", + "URL": "https://github.com/vubiostat/r-yaml/", + "BugReports": "https://github.com/vubiostat/r-yaml/issues", + "NeedsCompilation": "yes", + "Packaged": "2024-07-22 15:44:18 UTC; garbetsp", + "Repository": "RSPM", + "Date/Publication": "2024-07-26 15:10:02 UTC", + "Encoding": "UTF-8", + "Built": "R 4.4.0; x86_64-pc-linux-gnu; 2026-01-29 00:22:23 UTC; unix", + "RemotePkgRef": "yaml@2.3.10", + "RemoteType": "standard", + "RemoteEtag": "\"d9c27141ba0919211581ff57900185b7\"", + "RemotePackaged": "TRUE", + "RemoteRef": "yaml", + "RemoteRepos": "https://packagemanager.posit.co/cran/latest", + "RemotePkgPlatform": "source", + "RemoteSha": "2.3.10" + } + } + }, + "files": { + "_pkgdown.yml": { + "checksum": "0011c337c551a64f98afc7796d7be1f1" + }, + ".github/workflows/pkgdown.yaml": { + "checksum": "03db6d9e1720ba345199629faa1f30c5" + }, + ".github/workflows/R-CMD-check-devel.yaml": { + "checksum": "f7150e54a9dfd7b348e86b60b84d0afc" + }, + ".github/workflows/R-CMD-check-master.yaml": { + "checksum": "3a31a15565e05e06992b512d9efef71a" + }, + ".github/workflows/test-coverage.yaml": { + "checksum": "f3000b3783fd449fc5fb0146fd22ce1d" + }, + ".posit/publish/deployments/deployment-KKS7.toml": { + "checksum": "2d03d24dc2c403c6793f1e4e85609d0c" + }, + ".posit/publish/tidyCDISC-QL3D.toml": { + "checksum": "4c559d4829f2c35e791a5db2281d2c21" + }, + ".Rbuildignore": { + "checksum": "099628a5fd7d45cf3e88dfcae385393e" + }, + ".Rprofile": { + "checksum": "d0578fd29879cd0233ca58afeea3276e" + }, + "app.R": { + "checksum": "839175779c29638e3a8a3e09ddb59a7a" + }, + "CODE_OF_CONDUCT.md": { + "checksum": "f44aaac51a60237b86f18e87c40f234c" + }, + "cran-comments.md": { + "checksum": "f86a4e8dcf46a43926161cd5953e6b3d" + }, + "data-raw/adae.R": { + "checksum": "56eb72fed61beff096624c36e2de7a23" + }, + "data-raw/adae.xpt": { + "checksum": "b9e1042c52eb3b5a0abff2a1c61bb1ea" + }, + "data-raw/adlbc.R": { + "checksum": "6fab01138bb5406594cb27ae327b7306" + }, + "data-raw/adlbc.xpt": { + "checksum": "09150cf26d5709b5d673ce9be78a4b3d" + }, + "data-raw/adsl.R": { + "checksum": "9e45dddd8655497aaea57cb4318f5119" + }, + "data-raw/adsl.xpt": { + "checksum": "5e1cf74cc6c32c99cdc2256f498ecbb9" + }, + "data-raw/adtte.R": { + "checksum": "b5682148ec522c3666637175838f982b" + }, + "data-raw/adtte.xpt": { + "checksum": "8f17bfd7010d89d1ed7c03e16e7f1bff" + }, + "data-raw/advs.R": { + "checksum": "9d19d840ca707402726a83d38ae204a7" + }, + "data-raw/advs.xpt": { + "checksum": "076b826b9342652409a166faedc2b6a1" + }, + "data-raw/examples_data.R": { + "checksum": "3115c7acf0811519c30b7ba7c97bec8d" + }, + "data-raw/internal-data.R": { + "checksum": "2ad7cfcd4fa8f1723a4b890b3064a9cc" + }, + "data/adae.rda": { + "checksum": "0595055183f96254824660d9d6e476c1" + }, + "data/adlbc.rda": { + "checksum": "807c2754ddabe4035928165018027e6d" + }, + "data/adsl.rda": { + "checksum": "938892677ebf9c29695c3857d8147014" + }, + "data/adtte.rda": { + "checksum": "4eeab2add0a28a5ef916b84dd2fe6699" + }, + "data/advs.rda": { + "checksum": "61efa82920fa062e23d6215dfbdb74be" + }, + "data/example_dat1.rda": { + "checksum": "f0d21778d89cc8a043798fe3effb5474" + }, + "data/example_dat2.rda": { + "checksum": "ff7c20bfbd281d79cfb8d038d45eafaf" + }, + "DESCRIPTION": { + "checksum": "0a795705a0afaf9fac74b9af92ba5362" + }, + "dev/01_start.R": { + "checksum": "e9bef12080fe566347b271f64e90cad6" + }, + "dev/02_dev.R": { + "checksum": "db3f340946ea4faaa9cc9a671a5a6502" + }, + "dev/03_deploy.R": { + "checksum": "bc49f92b1001faf75d026b9dc62450d3" + }, + "dev/adam_requirements.R": { + "checksum": "08d70faa4bd5ac1bdf523757e0796b07" + }, + "dev/renv_setup.R": { + "checksum": "7ff6864366fbec347c922e4281432c47" + }, + "dev/run_dev.R": { + "checksum": "c91e025a750534fe625ce6b799cf47cb" + }, + "inst/app/www/accordian.js": { + "checksum": "23852ca887d6053de8f6380297310f1a" + }, + "inst/app/www/app_FAVICON.ico": { + "checksum": "0356fd73062e635dd0b61db22ca21b45" + }, + "inst/app/www/app_ICON.png": { + "checksum": "f3e1d6341b795f158c12f5e70d8cb860" + }, + "inst/app/www/batchDownload_html.Rmd": { + "checksum": "34b0b8b3f69f2abbf8082f32ee40b670" + }, + "inst/app/www/batchDownload_pdf.Rmd": { + "checksum": "b451f84891c2c40864a813c71e4573e0" + }, + "inst/app/www/email.svg": { + "checksum": "75c645ada84dde8d198aaa31595cdec6" + }, + "inst/app/www/favicon.ico": { + "checksum": "0356fd73062e635dd0b61db22ca21b45" + }, + "inst/app/www/github.png": { + "checksum": "d56df49a807a9fd06eb1667a84d3810e" + }, + "inst/app/www/hex-tidyCDISC.png": { + "checksum": "0c13ec58a7d103012dc893d00f43bbbc" + }, + "inst/app/www/logo.svg": { + "checksum": "323e215868020ba7e04f90687d088259" + }, + "inst/app/www/recipe.js": { + "checksum": "c0c5224a008814851ef70506cb41a243" + }, + "inst/app/www/red_x.png": { + "checksum": "71ee35ce4c01cb0435f41f91f646eac6" + }, + "inst/app/www/script.js": { + "checksum": "9774316d6b0a17b2513275012a838d7e" + }, + "inst/app/www/styles.css": { + "checksum": "336477e43654914df950f7fef37ed773" + }, + "inst/app/www/sync_divs.js": { + "checksum": "2b37ed6291f86d6a4dc95093f3d2e3ff" + }, + "inst/app/www/timevis.css": { + "checksum": "151483d6dea251ee6558d15fbe9e398a" + }, + "inst/app/www/timevis.sass": { + "checksum": "b571fe6baaec101e9e62b73b214a74c5" + }, + "inst/app/www/yeti.css": { + "checksum": "5322ab77d46667d7ae63108c44d15188" + }, + "inst/golem-config.yml": { + "checksum": "f6923ef4c02d4d68cb95bdf2ebd076ce" + }, + "inst/WORDLIST": { + "checksum": "ac11c8a38cd26d0e3feadd3ab4ba526a" + }, + "LICENSE.md": { + "checksum": "fb01625ef01973490bcf4efb9ade23ae" + }, + "man/adae.Rd": { + "checksum": "dade9c4f1a5f11cd1af975aa812c5950" + }, + "man/adlbc.Rd": { + "checksum": "f5203776b0ed09638ded7ef04919c212" + }, + "man/adsl.Rd": { + "checksum": "25178252a890c3483a316e70097fabdd" + }, + "man/adtte.Rd": { + "checksum": "c84daec58d85fdc4b8e74b09a04fb966" + }, + "man/advs.Rd": { + "checksum": "c4ce52fb1c220690ca3cebaf8dfa909f" + }, + "man/app_methods.Rd": { + "checksum": "71e040de585f03cfab96d339571325e8" + }, + "man/col_for_list_expr.Rd": { + "checksum": "08c599c4978ffd73cc8959923084ba06" + }, + "man/common_rownames.Rd": { + "checksum": "709de9f5c14ea44d86158e7e07b66131" + }, + "man/data_to_filter.Rd": { + "checksum": "9d705c8defb2bf3b54dcaeca4cc85ccc" + }, + "man/data_to_use_str.Rd": { + "checksum": "b76c2e746ee502d0ffaa69f5bd4446d8" + }, + "man/example_dat1.Rd": { + "checksum": "efb355159f80d0e15d1a349cbdd29362" + }, + "man/example_dat2.Rd": { + "checksum": "9f679fff3003d3eb4111e684749da9e4" + }, + "man/figures/app_ICON.png": { + "checksum": "f3e1d6341b795f158c12f5e70d8cb860" + }, + "man/figures/blog-word-cloud.jpg": { + "checksum": "5e1bb93a2e7ce90201a105a8afe1ce10" + }, + "man/figures/demo_tidyCDISC_button_lite2dark.png": { + "checksum": "3a4be743d3a9dcb42b70a901f9e55233" + }, + "man/figures/hex-tidyCDISC-170h.png": { + "checksum": "5e07a7d661d46b6dda2189d12a26c9ab" + }, + "man/figures/hex-tidyCDISC.png": { + "checksum": "0c13ec58a7d103012dc893d00f43bbbc" + }, + "man/figures/news.png": { + "checksum": "a5ebe5af12f436e98ec2e9134d068af9" + }, + "man/figures/pct_95_cropped.jpg": { + "checksum": "004090e353d411b31a6490ce4d180b0d" + }, + "man/figures/pct_95.jpg": { + "checksum": "2b9bee8fa5245f49b57fb72d29cd18c8" + }, + "man/figures/tidyCDISC_RMedicine_thumbnail.png": { + "checksum": "ee263c8e5b77b0300b44f898bcc96435" + }, + "man/figures/youtube.png": { + "checksum": "3df88c512fc9d7e037237d9ca9d93be0" + }, + "man/get_levels.Rd": { + "checksum": "4218f64f80145ad5d9f9d6bbe8a6b1b4" + }, + "man/prep_adae.Rd": { + "checksum": "c0ed0aedaea7e2cc514ab5e294cfe241" + }, + "man/prep_adsl.Rd": { + "checksum": "523f2b87f01a90d2ecbd5c24176dfe2e" + }, + "man/prep_bds.Rd": { + "checksum": "07ebc0db9e8a6eddecb8704fe6204783" + }, + "man/pretty_IDs.Rd": { + "checksum": "33f198a26b29dd28aa70cf6a3b93e799" + }, + "man/run_app.Rd": { + "checksum": "9ecb5ebac54f09d4939ba4518d375a28" + }, + "man/show_adamish_alert.Rd": { + "checksum": "c97ae383d12bac806d06dcfc6bc32560" + }, + "man/std_footnote.Rd": { + "checksum": "bec750cd9d93f9db6209bcf0bffe90d7" + }, + "man/suggest_adam_column_mapping.Rd": { + "checksum": "8fa6e5bde3bcfacb0a58833c355cd393" + }, + "man/suggest_adam_domain.Rd": { + "checksum": "80ad82ba141e6d167aadc788baaa1d7a" + }, + "man/tg_gt.Rd": { + "checksum": "80e505fb7d5b285cf6d6db6d858a59a4" + }, + "man/validate_adamish.Rd": { + "checksum": "a5e3844077188dccd576bb88113792c7" + }, + "man/varN_fctr_reorder.Rd": { + "checksum": "1caad9e36c4cd492af353079068aa69d" + }, + "NAMESPACE": { + "checksum": "0267a599f2bedc32d7e772b6c6dfcb4b" + }, + "NEWS.md": { + "checksum": "21e0a81e30c07f8434863e1f0ccbc200" + }, + "R/_disable_autoload.R": { + "checksum": "1178c335d6c11555fd1c4ec6098dfee6" + }, + "R/app_config.R": { + "checksum": "52f04ff856ac5868ff591c7d3132a724" + }, + "R/app_server.R": { + "checksum": "dc6f6364b1003af4202d19800ac818f3" + }, + "R/app_ui.R": { + "checksum": "225b98d8e3497412f6098f3d7215bedd" + }, + "R/data-example.R": { + "checksum": "f30bae0d55bc3820fc577c22d56a86e3" + }, + "R/data-phuse_TDF_ADaM.R": { + "checksum": "226fa66cea43a69c5e3484052dc84c44" + }, + "R/global.R": { + "checksum": "af097d77e6b5c44cb0f79982f67d3801" + }, + "R/golem_utils_server.R": { + "checksum": "7842ff3b6b9df30b73fb5d1a8304318a" + }, + "R/golem_utils_ui.R": { + "checksum": "321aeedee7b0d80286322b8e362ad291" + }, + "R/mod_dataComply_fct_helpers.R": { + "checksum": "0d5cc183b269d3ea53094547da27f7b0" + }, + "R/mod_dataComply.R": { + "checksum": "f68271cc61004eba83855bc90a54fbf7" + }, + "R/mod_dataComplyRules_fct_helpers.R": { + "checksum": "abc86d51a3f228458baf4c38c37e3c73" + }, + "R/mod_dataComplyRules.R": { + "checksum": "a9ad906fd84f9114e4466ef5bf255760" + }, + "R/mod_dataUpload.R": { + "checksum": "c2427d2492aac3d694585de79b2c3e28" + }, + "R/mod_indvExp_fct_buildEvents.R": { + "checksum": "983e69081d4d1cfbe6fa2b5d3d2b61fa" + }, + "R/mod_indvExp_fct_organizeEvent.R": { + "checksum": "906a72fc9b7f7302ab5a295e20e0eb22" + }, + "R/mod_indvExp_srv.R": { + "checksum": "c93d3783c19308d709eaff7c8d428a6c" + }, + "R/mod_indvExp_ui.R": { + "checksum": "d57572177a3b737ecc5f6bf18ffaf5e7" + }, + "R/mod_indvExp_utils_helpers.R": { + "checksum": "3c5b3bda5c5f26c8806cb7d9441a7e38" + }, + "R/mod_indvExpPat.R": { + "checksum": "256e3eb0f1421e323f949b315fe031d2" + }, + "R/mod_indvExpPatEvents.R": { + "checksum": "182a5f543c6a574be4e1b87bd088122b" + }, + "R/mod_indvExpPatVisits_fct_plot.R": { + "checksum": "fb3eaf4652b613411a7ea761d55d80fb" + }, + "R/mod_indvExpPatVisits.R": { + "checksum": "2eef05282f05a28f81e22197c47da769" + }, + "R/mod_popExp_boxplot.R": { + "checksum": "ba07c2080a8073d7fee6f33152f0eaad" + }, + "R/mod_popExp_fct_boxplot.R": { + "checksum": "2b08564644e3e60a1eadbfbe652f16cc" + }, + "R/mod_popExp_fct_heatCorr.R": { + "checksum": "c1cb4c98344151a139a60d74d3ae523f" + }, + "R/mod_popExp_fct_km.R": { + "checksum": "c6d31b5eb4ae4cc4810e6167ec818bbe" + }, + "R/mod_popExp_fct_line.R": { + "checksum": "c769d3fd0261fb2c0af0339e86035516" + }, + "R/mod_popExp_fct_scatterplot.R": { + "checksum": "7f646e0765f8f2b257cefe7093e65cea" + }, + "R/mod_popExp_fct_spaghettiplot.R": { + "checksum": "d6bad5c365faae2cda86874742074267" + }, + "R/mod_popExp_heatCorr.R": { + "checksum": "6b8be4868d9c12ecbc514885b85e695f" + }, + "R/mod_popExp_km.R": { + "checksum": "d9fb6e3de7f3bf5742e1163cfb008a7f" + }, + "R/mod_popExp_line.R": { + "checksum": "5fa9bdcd563037f95a2325bb31bc2527" + }, + "R/mod_popExp_scatter.R": { + "checksum": "bacc7a93d74c8e13cf23df46af2bc6c5" + }, + "R/mod_popExp_spaghetti.R": { + "checksum": "1f36f6617a6980d3fca78ab808ef72bf" + }, + "R/mod_popExp_ui.R": { + "checksum": "b745068987d015a8c48c9e6f2209638d" + }, + "R/mod_popExp_utils.R": { + "checksum": "d5f8d69c53e630807eeb8554e45d972a" + }, + "R/mod_popExp.R": { + "checksum": "40214295bf45f36557f972322eea57d3" + }, + "R/mod_selectData.R": { + "checksum": "e3409a32b2045a3db98f6af2d8189b16" + }, + "R/mod_tableGen_fct_anova.R": { + "checksum": "2246c466a246da697b82a1626bfd3947" + }, + "R/mod_tableGen_fct_blocks.R": { + "checksum": "0d37937a080e4be2eacb25c17b26a26e" + }, + "R/mod_tableGen_fct_chg.R": { + "checksum": "2ffcc14ff1d17cf124a4d9e0f867fd7f" + }, + "R/mod_tableGen_fct_freq.R": { + "checksum": "dba903701c0a3540f8f2094fcb24f599" + }, + "R/mod_tableGen_fct_max_freq.R": { + "checksum": "c8dc820f952fecf74dbd65844f5acc77" + }, + "R/mod_tableGen_fct_mean.R": { + "checksum": "d8ebb73c0f93c2f7493e0388e178381b" + }, + "R/mod_tableGen_fct_meanSummary.R": { + "checksum": "94b24b749ccce1bcc468f92a60895940" + }, + "R/mod_tableGen_fct_methods.R": { + "checksum": "e4bfa9aa9cdf89a25f42e91cc3446678" + }, + "R/mod_tableGen_fct_nested_freq.R": { + "checksum": "3630b68984ba433caef1a1c718be1ec8" + }, + "R/mod_tableGen_fct_non_missing.R": { + "checksum": "a58d8ab74a1645225f1480bbf56bba6d" + }, + "R/mod_tableGen_fct_y.R": { + "checksum": "41642002a10d412e2b8e5884fb620d4b" + }, + "R/mod_tableGen_ui.R": { + "checksum": "7569ff40af3645185a8df486cf30f3c8" + }, + "R/mod_tableGen_utils.R": { + "checksum": "24bcd36492a5b745b10c5ebe16a69ff7" + }, + "R/mod_tableGen.R": { + "checksum": "44de12829c21a714598883b3254c42d4" + }, + "R/run_app.R": { + "checksum": "fcee412ca388e3b87e786f4f9ed1bf7b" + }, + "R/sysdata.rda": { + "checksum": "df42104adf43f99bcd54b9ddf1c15e2c" + }, + "R/utils_adam.R": { + "checksum": "13a134bef3bc73d65cfbf2f3a14d10a5" + }, + "R/utils_helpers.R": { + "checksum": "4c47b1daea4b3800941b1f9c01467176" + }, + "R/utils_read_data.R": { + "checksum": "666b2c7da8d4d95d5ca27f792298a975" + }, + "R/utils_SAScompare.R": { + "checksum": "ea12fa60111dc8236c58f2004f7e4b1d" + }, + "R/utils_strObjs.R": { + "checksum": "466456d681e65d3e62043b15679e42e5" + }, + "R/utils-pipe.R": { + "checksum": "f7716e45c5ef3ee1161da0f77a59d9ec" + }, + "README.md": { + "checksum": "7d9b970af8bdfe4dd756ffe100197291" + }, + "README.Rmd": { + "checksum": "979f2bc3fc477501565a3d52cb4038a6" + }, + "renv.lock": { + "checksum": "a4edb4214e400fa55e4840e2f6e75c08" + }, + "revdep/email.yml": { + "checksum": "34952a5944548ea4fc132a9899f8e6ab" + }, + "scripts/os-health.R": { + "checksum": "e5650ea81ca35c3a3044da225f997493" + }, + "scripts/riskmetric.R": { + "checksum": "a0e4daceef14f4e2bbbd7f39b235ff3f" + }, + "tests/spelling.R": { + "checksum": "487979205980ade68f953547666e1879" + }, + "tests/testthat.R": { + "checksum": "36a4a42216352437f6376a5ce5fa607b" + }, + "tests/testthat/DESCRIPTION": { + "checksum": "5fe28901a19a8d521552a58317ebf8d4" + }, + "tests/testthat/Rplots.pdf": { + "checksum": "bfbb7dfc7743310de8a37cf165f25a4a" + }, + "tests/testthat/test-mod_dataComply_fct_helpers.R": { + "checksum": "6e85a35ddab4d9a80be54a43d313ed1c" + }, + "tests/testthat/test-mod_dataComplyRules_fct_helpers.R": { + "checksum": "91609d5a9969d316cf8d8b990a17a214" + }, + "tests/testthat/test-mod_indvExp_fct_buildEvents.R": { + "checksum": "3638a5900e254965b51caa78ebd7ea0b" + }, + "tests/testthat/test-mod_indvExpPatVisits_fct_plot.R": { + "checksum": "f4a571007cddc15eb13121370d33a412" + }, + "tests/testthat/test-mod_popExp_km.R": { + "checksum": "50d73f177873dec4b7ec0a58dfac664d" + }, + "tests/testthat/test-mod_tableGen_fct_anova.R": { + "checksum": "3d70736588edbe51306b5986aff18fc7" + }, + "tests/testthat/test-mod_tableGen_fct_chg.R": { + "checksum": "ce289f4a7d23fdd5685c08f72df89df6" + }, + "tests/testthat/test-popExp_fct_boxplot.R": { + "checksum": "4a562e5249b22410d4cc5167e7a77a00" + }, + "tests/testthat/test-popExp_fct_scatterplot.R": { + "checksum": "09950c2dda5ad1a44d39c15b7ed16f8f" + }, + "tests/testthat/test-popExp_fct_spaghettiplot.R": { + "checksum": "ca0d6d0584aa31daac2ed88d1713f1ce" + }, + "tests/testthat/test-tableGen_fct_blocks.R": { + "checksum": "e0be2e134020204aa4ca39f3ad0f9708" + }, + "tests/testthat/test-tableGen_fct_freq.R": { + "checksum": "c593d2b54aaa52d8f2dcd2df14485ad0" + }, + "tests/testthat/test-tableGen_fct_max_freq.R": { + "checksum": "954f17a61e6aa22be247f4a274516f39" + }, + "tests/testthat/test-tableGen_fct_mean.R": { + "checksum": "21b2fb223ab0dfac9a3c883e74e32ba0" + }, + "tests/testthat/test-tableGen_fct_methods.R": { + "checksum": "4b3c76255eb73d2ad04eecbc14b11aed" + }, + "tests/testthat/test-tableGen_fct_nested_freq.R": { + "checksum": "4b5e2668fe104d1e5d2d9b0627854600" + }, + "tests/testthat/test-tableGen_fct_non_missing.R": { + "checksum": "0a9a296cb0360b6e8ae110c65246bc22" + }, + "tests/testthat/test-tableGen_fct_y_freq.R": { + "checksum": "857da11f3661e577ae2a4a61d26c9523" + }, + "vignettes/announcing-tidycdisc-0-0-1-1.Rmd": { + "checksum": "1ac870105d65194ab57ce5d50cf1c7d3" + }, + "vignettes/announcing-tidycdisc-0-2-1.Rmd": { + "checksum": "de1613b3d6e3425f169f6facc9921212" + }, + "vignettes/Blog.Rmd": { + "checksum": "634afed0bf3aa28a2a6a3906edb86711" + }, + "vignettes/cran_figures/02-TG-tidyCDISC.PNG": { + "checksum": "8ebae5a14c9dc2478746e179976d4b0a" + }, + "vignettes/cran_figures/03-age_mean.PNG": { + "checksum": "44f3af735edd7f926399325d48d6e7b4" + }, + "vignettes/cran_figures/04-diabp_mean.PNG": { + "checksum": "42054587dfa6d261f5170afc06f3bf4e" + }, + "vignettes/cran_figures/bins.PNG": { + "checksum": "60ebee27c66b3292f8948d34725d8c99" + }, + "vignettes/cran_figures/demo_tidyCDISC_button_lite2dark.png": { + "checksum": "3a4be743d3a9dcb42b70a901f9e55233" + }, + "vignettes/cran_figures/download_report.PNG": { + "checksum": "23eb70e9d05a1f855c7e825de69a8412" + }, + "vignettes/cran_figures/drill_down_events.PNG": { + "checksum": "b94744acb0c5a8b833bc0b594052ae98" + }, + "vignettes/cran_figures/drill_down_visits.PNG": { + "checksum": "0a2fac4aaf22a4b219219ca1d1a531a6" + }, + "vignettes/cran_figures/external-link-alt.PNG": { + "checksum": "60e5f13e56bf0959fa5b6b16092f6f21" + }, + "vignettes/cran_figures/filter_patients.PNG": { + "checksum": "0a7007536d931d004136bae920f9d385" + }, + "vignettes/cran_figures/landing_page_tidyCDISC.PNG": { + "checksum": "c7044f4a89241c7ad48e03316fabe8d6" + }, + "vignettes/cran_figures/line_plot_mean_over_time_breakdown.PNG": { + "checksum": "2bf122b6bc55e5e1eb613632463bdcfd" + }, + "vignettes/cran_figures/line_plot_mean_over_time_tidyCDISC.PNG": { + "checksum": "bd0fa28de14ea7ee74cb51684547612b" + }, + "vignettes/cran_figures/quick_upload_then_tg_tidyCDISC_red.PNG": { + "checksum": "f463c33d229953948bdf209fe2c83f86" + }, + "vignettes/cran_figures/quick_upload_then_tg_tidyCDISC.PNG": { + "checksum": "198b238f27e0da219da4c3a37fe5f119" + }, + "vignettes/cran_figures/t_disp_red.PNG": { + "checksum": "be31c977375834e6b6777ec77865c765" + }, + "vignettes/cran_figures/t_disp.PNG": { + "checksum": "ac805a7ab88b16f94a7672b06c442e39" + }, + "vignettes/cran_figures/TG_need_help.PNG": { + "checksum": "ee07779ceccd82684582dd44b5a68d60" + }, + "vignettes/cran_figures/TG_STAN_dropdown.PNG": { + "checksum": "2430a0b17366f2e31c0bfa715a84c962" + }, + "vignettes/dev01_Table_Gen.Rmd": { + "checksum": "14b35021cfee65d55deab678467bec4c" + }, + "vignettes/dev02_Pop_Exp.Rmd": { + "checksum": "820268bc618c373f14a8bba85dc18474" + }, + "vignettes/dev03_Indv_Expl.Rmd": { + "checksum": "f3c48e4bee02ea721305ebab4526a424" + }, + "vignettes/figures/blog-0-2-1/atpt_dropdown.png": { + "checksum": "d1cdc9c7f7e3360ee8f8ed0132e609dd" + }, + "vignettes/figures/blog-0-2-1/atpt_output.png": { + "checksum": "e4fbacda91f474fc992e5f56b53d5bcf" + }, + "vignettes/figures/blog-0-2-1/hlines_gone.png": { + "checksum": "d28774a4940e58fb9b7f5db21c13c19e" + }, + "vignettes/figures/blog-0-2-1/hlines_present.png": { + "checksum": "e2758f7dd23a125c2934f194d7e905a2" + }, + "vignettes/figures/blog-0-2-1/rtf_output_download_table_arrow.png": { + "checksum": "1e52a91b32bf769506a02645071e5661" + }, + "vignettes/figures/blog-0-2-1/rtf_output.png": { + "checksum": "1ac699e6cd82eda4d8c7d5ddcb4bf8da" + }, + "vignettes/figures/blog-0-2-1/select_all_output.png": { + "checksum": "d794afacb34b5e701525567928e594a1" + }, + "vignettes/figures/blog-0-2-1/select_all.png": { + "checksum": "48cc9c69aaf0e29f28a0180e9d27d035" + }, + "vignettes/figures/blog-0-2-1/studyid_w_arrow.png": { + "checksum": "478ca18e9fec68507d8bbe8fc3ddfd7a" + }, + "vignettes/figures/blog-0-2-1/table_footnote_field_arrow.png": { + "checksum": "60e29cc6585c346ff5cff0918ca3942c" + }, + "vignettes/figures/blog-0-2-1/table_footnote_output_arrow.png": { + "checksum": "29420256fdafee02ffb1e132c0997837" + }, + "vignettes/figures/blog-0-2-1/table41_all.png": { + "checksum": "df8b04cf676b0dc1c1fd1d2b3b868571" + }, + "vignettes/figures/blog/demo_tidyCDISC_button_lite2dark_aura_cropped.png": { + "checksum": "b5f339a77f5fef3969cac2cfcdaf3dc9" + }, + "vignettes/figures/blog/important_announcement_cropped.jpg": { + "checksum": "532e15e53b7baf18f0b497b69f6b5c99" + }, + "vignettes/figures/blog/important_announcement.jpg": { + "checksum": "f5cdeb82d3c574b3b33302b9fadc7879" + }, + "vignettes/figures/demo_tidyCDISC_button_dark2lite_aura.PNG": { + "checksum": "ddaa0cfe05016fad8033d4fde8565e21" + }, + "vignettes/figures/demo_tidyCDISC_button_dark2lite.png": { + "checksum": "8638036e0e0746db3ed2619c7b8b46f4" + }, + "vignettes/figures/demo_tidyCDISC_button_lite2dark_aura_cropped.png": { + "checksum": "cfc95870115e7135d1776848f7decdb4" + }, + "vignettes/figures/demo_tidyCDISC_button_lite2dark_aura.PNG": { + "checksum": "9cb34e3a68f65c98b69f9d33be036e0b" + }, + "vignettes/figures/demo_tidyCDISC_button_lite2dark.png": { + "checksum": "3a4be743d3a9dcb42b70a901f9e55233" + }, + "vignettes/figures/demo_tidyCDISC_button_solid_blue_aura.PNG": { + "checksum": "ce9095d5b8de1ee8c24f1d927e2f87f3" + }, + "vignettes/figures/demo_tidyCDISC_button_solid_blue.png": { + "checksum": "0a77a4a2229092df93507a6cc760609e" + }, + "vignettes/figures/filter/filter_adsl_dbl_chr_fct.PNG": { + "checksum": "c20fdee3d41d4807aa6574fb1c65349b" + }, + "vignettes/figures/filter/filter_button.PNG": { + "checksum": "aa7097c8a879ee6be24c2682ae6bc80a" + }, + "vignettes/figures/filter/filter_dbl_chr_fct.PNG": { + "checksum": "c66d6c49e1549e36e6580701dcacc6f2" + }, + "vignettes/figures/filter/filter_dbl.PNG": { + "checksum": "a488923f96177bb6580aa2136b424224" + }, + "vignettes/figures/filter/filter_no_NAs_change_date.gif": { + "checksum": "ab3adf4121db23812b539a49fb9916d0" + }, + "vignettes/figures/filter/filter_reorder_and_del.gif": { + "checksum": "749edbd4acb3d5b5a805a01536757444" + }, + "vignettes/figures/filter/filter_search.PNG": { + "checksum": "26c65c7037bd244a30c8200b3f33ea18" + }, + "vignettes/figures/filter/filtering_date_rows_reduced.PNG": { + "checksum": "0d2f4fda2462ffd115f7cc40255d401a" + }, + "vignettes/figures/filter/filtering_date.PNG": { + "checksum": "d48323e8d33828b5f4cd1b400417ab66" + }, + "vignettes/figures/filter/find_button_indvExp.gif": { + "checksum": "9a89516d2922548a36601d5a08248e0b" + }, + "vignettes/figures/filter/find_button_popex_OG.gif": { + "checksum": "f089ae095802aac98dea9acc6f1cf782" + }, + "vignettes/figures/filter/find_button_popex.gif": { + "checksum": "6653de717a22d25b8e679156baafaebf" + }, + "vignettes/figures/filter/find_button_tg.gif": { + "checksum": "318a978bbe54fccc05a98b28016ceba8" + }, + "vignettes/figures/filter/popEx_Filtering_text.PNG": { + "checksum": "35802bee4b90d33d064dbfd5dd460531" + }, + "vignettes/figures/filter/select_multi_data.PNG": { + "checksum": "adb4dca64c44a57558d4c985d1bd9c91" + }, + "vignettes/figures/IndvExp/01_dataUpload.PNG": { + "checksum": "5503d8b1d7c7da5fc7900c6d2c613291" + }, + "vignettes/figures/IndvExp/02_start.PNG": { + "checksum": "9b0b9cc1f73a2d65bedd9e013f96eea4" + }, + "vignettes/figures/IndvExp/03_adv_filt.PNG": { + "checksum": "95e06d6409c4ab28af59cc90c5554eb4" + }, + "vignettes/figures/IndvExp/04_adv_filt_2_dfs.PNG": { + "checksum": "d4ce17424600dcca822478eb34208984" + }, + "vignettes/figures/IndvExp/05_adv_filt_2_dfs_abs.PNG": { + "checksum": "085f0fcbaaec5e57538d0fe8015e6cad" + }, + "vignettes/figures/IndvExp/06_adv_filt_2_dfs_age.PNG": { + "checksum": "50bdcfa3eba626a9667a073e5d4ec24d" + }, + "vignettes/figures/IndvExp/07_selPatNo.PNG": { + "checksum": "fb131c236c66de28977be25e8fad95d6" + }, + "vignettes/figures/IndvExp/08_events_sel.PNG": { + "checksum": "6dc99f9a1c7f31e8d75aa568f8919260" + }, + "vignettes/figures/IndvExp/09_events_all.PNG": { + "checksum": "82899ee3ff446e771b5553eb20aaf927" + }, + "vignettes/figures/IndvExp/10_events_applyFilters.PNG": { + "checksum": "c85097e749c8eb00254e625a8c83eeac" + }, + "vignettes/figures/IndvExp/11_events_datatable.PNG": { + "checksum": "9bc82003515139c5b8d840da1e2372e5" + }, + "vignettes/figures/IndvExp/11_visits_default.PNG": { + "checksum": "244c9b6e467d4ca752583bad8b9065f3" + }, + "vignettes/figures/IndvExp/12_visits_default.PNG": { + "checksum": "244c9b6e467d4ca752583bad8b9065f3" + }, + "vignettes/figures/IndvExp/13_visits_sel_adam.PNG": { + "checksum": "5a00c3007511f0370b85f0b2a2b0a9d3" + }, + "vignettes/figures/IndvExp/14_visits_sel_paramcd.PNG": { + "checksum": "9a8084db7f659b3f5e2c753391d16d16" + }, + "vignettes/figures/IndvExp/15_visits_sel_visit.PNG": { + "checksum": "18d9f5dd8bab972d5a0e4677914b42e5" + }, + "vignettes/figures/IndvExp/16_visits_sel_overlay_hor_graph.PNG": { + "checksum": "d318c5d16d36ca3edd9152e1bbaa803b" + }, + "vignettes/figures/IndvExp/16_visits_sel_overlay_hor.PNG": { + "checksum": "52ef25bf2334331584781519b1a7a9a8" + }, + "vignettes/figures/IndvExp/16_visits_sel_overlay.PNG": { + "checksum": "d096fd29dc95a0b4343d2def738b1795" + }, + "vignettes/figures/IndvExp/17_visits_sel_overlay_events.PNG": { + "checksum": "e949b136c9bb6b01f454819c0d4511f3" + }, + "vignettes/figures/IndvExp/18_visits_sel_overlay_events_graph.PNG": { + "checksum": "17ed0a5dd3b7f40d8573f06b5e41f75b" + }, + "vignettes/figures/IndvExp/19_visits_sel_overlay_events_prefilters.PNG": { + "checksum": "25570828f5cf72897ab8266872d75c74" + }, + "vignettes/figures/IndvExp/20_visits_sel_overlay_events_prefilters_graph.PNG": { + "checksum": "fda9b28d18e1dbc0956c768f651822eb" + }, + "vignettes/figures/IndvExp/21_visits_sel_overlay_events_manfilt.PNG": { + "checksum": "43eb73318facd59ee9dfa21261d04d03" + }, + "vignettes/figures/IndvExp/22_visits_sel_overlay_events_manfilt_plot.PNG": { + "checksum": "752bdbe5728b94e802938dfb0c6b1a53" + }, + "vignettes/figures/IndvExp/23_visits_datatable.PNG": { + "checksum": "68c66337bd5b7468ddb15686fc54f645" + }, + "vignettes/figures/IndvExp/24_bd.PNG": { + "checksum": "001277ddcef1c9aa2ec7faf842d0e7d8" + }, + "vignettes/figures/IndvExp/25_bd_report.PNG": { + "checksum": "1b51d3a152a6f00151f44ba1507c82a2" + }, + "vignettes/figures/IndvExp/drill_down_events.gif": { + "checksum": "913d8ccf5cb36a9d36e34f09ceec11b5" + }, + "vignettes/figures/IndvExp/drill_down_visits.gif": { + "checksum": "3747c65f160adc8313576d423d196631" + }, + "vignettes/figures/IndvExp/Events_Plot_Interactivity.gif": { + "checksum": "c8e1ed043eb01a08ff6282998e381928" + }, + "vignettes/figures/IndvExp/filter_patients.gif": { + "checksum": "eb99be0e1c8cab75c25de2c8048b8d0e" + }, + "vignettes/figures/IndvExp/org_df_events_output.PNG": { + "checksum": "eaad33853f3c4a0563fdef04547cf12f" + }, + "vignettes/figures/IndvExp/q.PNG": { + "checksum": "05caa3d9a7a41c9bfea81811c7b38f94" + }, + "vignettes/figures/IndvExp/Visits_Plot_Interactivity.gif": { + "checksum": "65c4e21e04b5ecf4551b5329beb5eb03" + }, + "vignettes/figures/overlay_tidyCDISC_noBulb.PNG": { + "checksum": "7857e470049de211c17a60a2f8f69344" + }, + "vignettes/figures/overlay_tidyCDISC.PNG": { + "checksum": "abfabc31d3cc4eaacc48d8f4e7181418" + }, + "vignettes/figures/popExp/apply_filters_toggle.gif": { + "checksum": "fc4dee1824a21c53aecdd02889f02370" + }, + "vignettes/figures/popExp/basic_plot.PNG": { + "checksum": "dff11a85d9d3d194013ecf9c138b65d0" + }, + "vignettes/figures/popExp/box_add_points.PNG": { + "checksum": "a34ad89434487b13dd94912aca3edf41" + }, + "vignettes/figures/popExp/box_controls.PNG": { + "checksum": "1d323476e1c533eeb4500b07b18844a0" + }, + "vignettes/figures/popExp/box_plot_add_points.PNG": { + "checksum": "3587b2c2606f0d9bd24b18cbed930b5d" + }, + "vignettes/figures/popExp/box_plot_controls.PNG": { + "checksum": "1d323476e1c533eeb4500b07b18844a0" + }, + "vignettes/figures/popExp/box_plot.PNG": { + "checksum": "dd04c3a3e343773ced927e31bbda8ac8" + }, + "vignettes/figures/popExp/boxplot_tidyCDISC.PNG": { + "checksum": "871111191b778f30805d4a76e8d8cf48" + }, + "vignettes/figures/popExp/Boxplot.png": { + "checksum": "e27c8a011c613df3ad3e9c7e4b434eae" + }, + "vignettes/figures/popExp/color_by_and_group_by.PNG": { + "checksum": "9c9673435bc603edc8726cab47ed75e8" + }, + "vignettes/figures/popExp/color_by.PNG": { + "checksum": "e7c9afe0d5938399c4dbf10932e50f99" + }, + "vignettes/figures/popExp/create_plot.png": { + "checksum": "df99dd15091d0e7a4044ec1e6d117aed" + }, + "vignettes/figures/popExp/download_data.PNG": { + "checksum": "cb278a4f46070449807c314cf2646c47" + }, + "vignettes/figures/popExp/filtering_widget.PNG": { + "checksum": "7c7bd69f8d997194b841e385c2430ff0" + }, + "vignettes/figures/popExp/general_param_setup.PNG": { + "checksum": "3ae5172bfa9f3133956804431d8b6808" + }, + "vignettes/figures/popExp/general_var_setup.PNG": { + "checksum": "a6bc1eb8692656a5cc866b03a69a4e04" + }, + "vignettes/figures/popExp/geom_histogram.png": { + "checksum": "e25f1ac453a9e82873e0918c11755124" + }, + "vignettes/figures/popExp/group_by.PNG": { + "checksum": "7cd2268d6d7453c9bc38e4f1b61f323f" + }, + "vignettes/figures/popExp/group_data.PNG": { + "checksum": "bd7d5c32f25abf25df84eefb10304649" + }, + "vignettes/figures/popExp/heatmap_controls_grouped.PNG": { + "checksum": "8559d83a4e4f29acfd8dd005b0fa9440" + }, + "vignettes/figures/popExp/heatmap_controls.PNG": { + "checksum": "a76dee9f2a2fb6cdd4054c060a50203e" + }, + "vignettes/figures/popExp/heatmap_data.PNG": { + "checksum": "e1dcc95d6a2e866470d1316ce6f03abf" + }, + "vignettes/figures/popExp/heatmap_grouped.PNG": { + "checksum": "dd5707f25be59747e31eb02a6b911ab1" + }, + "vignettes/figures/popExp/heatmap.PNG": { + "checksum": "64249d0ac556e98d35f6d67527e37724" + }, + "vignettes/figures/popExp/interactivity.gif": { + "checksum": "f93fd5530e923f83a7f48684f14272b6" + }, + "vignettes/figures/popExp/km_controls_grouped.PNG": { + "checksum": "f7eae9f8b25bd4ff11fd9f78b9024f97" + }, + "vignettes/figures/popExp/km_controls.PNG": { + "checksum": "1e61b0bdbb29637e7c9fc3fce196c416" + }, + "vignettes/figures/popExp/km_grouped.PNG": { + "checksum": "1b74dcce2c54246ef8caecec39d73920" + }, + "vignettes/figures/popExp/km.PNG": { + "checksum": "088aa6051253266d62144df04b887599" + }, + "vignettes/figures/popExp/layout_tidyCDISC.PNG": { + "checksum": "52bb6364e970107196ebcbf4214831a6" + }, + "vignettes/figures/popExp/layout.PNG": { + "checksum": "7a28c78506c99ed84d0de58993983e88" + }, + "vignettes/figures/popExp/line_plot_95_ci.PNG": { + "checksum": "0df93902eb43131dacf7bf67bcace5be" + }, + "vignettes/figures/popExp/line_plot_controls.PNG": { + "checksum": "5447fc2d19de0b8e257451a2adfe55e9" + }, + "vignettes/figures/popExp/line_plot_data.PNG": { + "checksum": "1ef89ddbc8b5f2456fc2468b1498a505" + }, + "vignettes/figures/popExp/line_plot_mean_over_time_breakdown.gif": { + "checksum": "64fb01f9e7b44c1d4821f8691771f6a4" + }, + "vignettes/figures/popExp/line_plot_mean_over_time_tidyCDISC.gif": { + "checksum": "116246ebfd0090eb49c13b87ade39a6e" + }, + "vignettes/figures/popExp/line_plot_mean_over_time.gif": { + "checksum": "034e917ea58c653df56f1827794aaf94" + }, + "vignettes/figures/popExp/line_plot_option_chng.PNG": { + "checksum": "8642b1f666c2742f40f596a9401e9e4d" + }, + "vignettes/figures/popExp/line_plot.PNG": { + "checksum": "2090a7c55aab1a5d7e1bddb836f25fd2" + }, + "vignettes/figures/popExp/need_help.gif": { + "checksum": "6dfb7aa104a0437cbfc675d4333b0942" + }, + "vignettes/figures/popExp/scatter_controls.PNG": { + "checksum": "8b0a827973df71950ffffdd554994355" + }, + "vignettes/figures/popExp/scatter_outlier.PNG": { + "checksum": "54fbcb1d2b738ba40598f2055f7f9791" + }, + "vignettes/figures/popExp/spaghetti_controls.PNG": { + "checksum": "1425f57ad2550232aedecb88aad4ea70" + }, + "vignettes/figures/popExp/spaghetti_plot.PNG": { + "checksum": "e71f80fbeb96a2484fc3478ed13ab792" + }, + "vignettes/figures/popExp/tutorial_data.PNG": { + "checksum": "eb333c065230fb9c64cf507b18d8c3d6" + }, + "vignettes/figures/popExp/type_of_chart.PNG": { + "checksum": "41c73696441fe13b28bf5fd9a8184531" + }, + "vignettes/figures/tableGen/02-TG-tidyCDISC.PNG": { + "checksum": "8ebae5a14c9dc2478746e179976d4b0a" + }, + "vignettes/figures/tableGen/02-TG.png": { + "checksum": "49c55eebc304bb0bfa52c5cd7a8a7209" + }, + "vignettes/figures/tableGen/03-age_mean.gif": { + "checksum": "e409e0a40e163f29a81c052d3bc654b9" + }, + "vignettes/figures/tableGen/04-diabp_mean.gif": { + "checksum": "aa468c56521d8b08ada01290d8aa09f0" + }, + "vignettes/figures/tableGen/add_freq_reshuffle_delete.gif": { + "checksum": "e8aa1ba55db0d2bb91619ece2ba44dea" + }, + "vignettes/figures/tableGen/bins.gif": { + "checksum": "677ef772f63abb33c3df41c029a62a6c" + }, + "vignettes/figures/tableGen/grouped_by.PNG": { + "checksum": "fd3db721fbce87cc2b4c1c00e38fb053" + }, + "vignettes/figures/tableGen/grouping.gif": { + "checksum": "9f60db6b3561bdb021c8978bcca040d2" + }, + "vignettes/figures/tableGen/new_release_stat_blocks.PNG": { + "checksum": "35968c416fb03ab48f04ce85efbeeef8" + }, + "vignettes/figures/tableGen/quick_upload_then_tg_tidyCDISC.gif": { + "checksum": "c0b868cb732aee1026a4c465b9bbfd69" + }, + "vignettes/figures/tableGen/quick_upload_then_tg.gif": { + "checksum": "45038df5a8569296321908baaf8e6a04" + }, + "vignettes/figures/tableGen/t_disp.gif": { + "checksum": "5f75dbc9383a2c789cfd6d3237c616bb" + }, + "vignettes/figures/tableGen/TG_Anova_dd.PNG": { + "checksum": "7098854c9bf746b863a466255a23f1e7" + }, + "vignettes/figures/tableGen/TG_Anova.PNG": { + "checksum": "8e280870cfe0adc4aa8376ccb25ccb06" + }, + "vignettes/figures/tableGen/TG_CHG.PNG": { + "checksum": "352e81596ffff0cc130cb523169bef1b" + }, + "vignettes/figures/tableGen/TG_export_table.PNG": { + "checksum": "5e760ace1ea2517f0233efc03e4bfddf" + }, + "vignettes/figures/tableGen/TG_filtering.PNG": { + "checksum": "3241a03ee89b066853b065a34eeeef00" + }, + "vignettes/figures/tableGen/TG_MAX_FREQ.PNG": { + "checksum": "28f659e54c6ea7cefa882ee80716983d" + }, + "vignettes/figures/tableGen/TG_need_help_guide_demo.gif": { + "checksum": "8771fb0b26656337547f2ebcfc491487" + }, + "vignettes/figures/tableGen/TG_need_help.PNG": { + "checksum": "ee07779ceccd82684582dd44b5a68d60" + }, + "vignettes/figures/tableGen/TG_Nested_Freq.PNG": { + "checksum": "b8aa3274f35ddd69c5b06c815a473d20" + }, + "vignettes/figures/tableGen/TG_Nested_Freq2.PNG": { + "checksum": "1766ca44a5496931c2281d35e7c12a56" + }, + "vignettes/figures/tableGen/TG_NON_MISSING.PNG": { + "checksum": "454ba7f80beb39695bbb410f7caa0e1b" + }, + "vignettes/figures/tableGen/TG_reproduce_code_tidyCDISC.PNG": { + "checksum": "c18a77dc0c3dbf7ad02ed06025232fdb" + }, + "vignettes/figures/tableGen/TG_reproduce_code.PNG": { + "checksum": "025a45fdbe34e145df88a2689032dd36" + }, + "vignettes/figures/tableGen/TG_reprpoduce_button.PNG": { + "checksum": "9749c474ef073a2602463b439d58487a" + }, + "vignettes/figures/tableGen/TG_STAN_dropdown.PNG": { + "checksum": "2430a0b17366f2e31c0bfa715a84c962" + }, + "vignettes/figures/tableGen/TG_STAN_TAB41_DD.PNG": { + "checksum": "ce2d94d8ab759c397bdb49dc8861e497" + }, + "vignettes/figures/tableGen/TG_STAN_TAB41.PNG": { + "checksum": "eee83f7aab044c278ae0823d5db121f7" + }, + "vignettes/figures/tableGen/TG_Y_FREQ.PNG": { + "checksum": "e04e435e90c2068965dbe9f264d89149" + }, + "vignettes/figures/tableGen/title_download.gif": { + "checksum": "49925344e055f77f98058563ad51fb55" + }, + "vignettes/figures/upldDat/browse.PNG": { + "checksum": "6cb4236bfb2a3aeca3973aacd292587a" + }, + "vignettes/figures/upldDat/cdisc_pilot_button.PNG": { + "checksum": "e3ff5a62bf434adee93893eb3d842bdb" + }, + "vignettes/figures/upldDat/error.PNG": { + "checksum": "4e5fa32da9cd30d8ab692ad1d25d6d34" + }, + "vignettes/figures/upldDat/landing_page_tidyCDISC.PNG": { + "checksum": "c7044f4a89241c7ad48e03316fabe8d6" + }, + "vignettes/figures/upldDat/landing_page.PNG": { + "checksum": "92578be1936a0c762a91bf6b48214f2d" + }, + "vignettes/figures/upldDat/upload_rules.PNG": { + "checksum": "8eea14b967043fcbf659e07da95e6a3a" + }, + "vignettes/figures/upldDat/use_and_browse_pilot_data_tidyCDISC.gif": { + "checksum": "5fcb0d0244dd37e6d616c4040b849070" + }, + "vignettes/figures/upldDat/use_and_browse_pilot_data.gif": { + "checksum": "858d605da9b1148393cdb03f9fb00654" + }, + "vignettes/getting_started.Rmd": { + "checksum": "83312df04566f3a0e8a664bf2e05293c" + }, + "vignettes/tidyCDISC.Rmd": { + "checksum": "56892ae235953709c482242524466c47" + }, + "vignettes/x00_Data_Upload.Rmd": { + "checksum": "12d110152b49c5803c36f58a9fb55b9f" + }, + "vignettes/x01_Table_Generator.Rmd": { + "checksum": "f1f1be99aefdbd844d95ce0eb34266a9" + }, + "vignettes/x02_Pop_Exp.Rmd": { + "checksum": "c63930bc2b9af0dc5363179c5ce4982a" + }, + "vignettes/x03_Indv_Expl.Rmd": { + "checksum": "6bc3e334f30a29c1c34c40309595ec9d" + }, + "vignettes/x04_Filtering.Rmd": { + "checksum": "622662820c54880a37951e19729f5df5" + } + }, + "users": null +} diff --git a/renv.lock b/renv.lock index 388baeb8..3949c6cc 100644 --- a/renv.lock +++ b/renv.lock @@ -1,2274 +1,5590 @@ { "R": { - "Version": "4.2.2", + "Version": "4.4.0", "Repositories": [ { "Name": "CRAN", - "URL": "https://packagemanager.rstudio.com/cran/2023-03-01" + "URL": "https://packagemanager.posit.co/cran/latest" } ] }, "Packages": { - "BH": { - "Package": "BH", - "Version": "1.81.0-1", - "Source": "Repository", - "Repository": "CRAN", - "Hash": "68122010f01c4dcfbe58ce7112f2433d", - "Requirements": [] - }, - "BiocManager": { - "Package": "BiocManager", - "Version": "1.30.20", - "Source": "Repository", - "Repository": "RSPM", - "Hash": "a7fca16a50b6ef7771b49d636dd54b57", - "Requirements": [] - }, "DT": { "Package": "DT", - "Version": "0.27", - "Source": "Repository", - "Repository": "RSPM", - "Hash": "3444e6ed78763f9f13aaa39f2481eb34", - "Requirements": [ + "Version": "0.33", + "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\")) )", + "Description": "Data objects in R can be rendered as HTML tables using the JavaScript library 'DataTables' (typically via R Markdown or Shiny). The 'DataTables' library has been included in this R package. The package name 'DT' is an abbreviation of 'DataTables'.", + "URL": "https://github.com/rstudio/DT", + "BugReports": "https://github.com/rstudio/DT/issues", + "License": "GPL-3 | file LICENSE", + "Imports": [ + "htmltools (>= 0.3.6)", + "htmlwidgets (>= 1.3)", + "httpuv", + "jsonlite (>= 0.9.16)", + "magrittr", "crosstalk", - "htmltools", - "htmlwidgets", "jquerylib", - "jsonlite", - "magrittr", "promises" - ] + ], + "Suggests": [ + "knitr (>= 1.8)", + "rmarkdown", + "shiny (>= 1.6)", + "bslib", + "future", + "testit", + "tibble" + ], + "VignetteBuilder": "knitr", + "RoxygenNote": "7.3.1", + "Encoding": "UTF-8", + "NeedsCompilation": "no", + "Author": "Yihui Xie [aut], Joe Cheng [aut, cre], Xianying Tan [aut], JJ Allaire [ctb], Maximilian Girlich [ctb], Greg Freedman Ellis [ctb], Johannes Rauh [ctb], SpryMedia Limited [ctb, cph] (DataTables in htmlwidgets/lib), Brian Reavis [ctb, cph] (selectize.js in htmlwidgets/lib), Leon Gersen [ctb, cph] (noUiSlider in htmlwidgets/lib), Bartek Szopka [ctb, cph] (jquery.highlight.js in htmlwidgets/lib), Alex Pickering [ctb], William Holmes [ctb], Mikko Marttila [ctb], Andres Quintero [ctb], Stéphane Laurent [ctb], Posit Software, PBC [cph, fnd]", + "Maintainer": "Joe Cheng ", + "Repository": "RSPM" }, "GGally": { "Package": "GGally", - "Version": "2.1.2", - "Source": "Repository", - "Repository": "CRAN", - "Hash": "022f78c8698724b326f1838b1a98cafa", - "Requirements": [ - "RColorBrewer", - "dplyr", - "forcats", - "ggplot2", - "gtable", + "Version": "2.2.1", + "Source": "Repository", + "License": "GPL (>= 2.0)", + "Title": "Extension to 'ggplot2'", + "Type": "Package", + "LazyLoad": "yes", + "LazyData": "true", + "URL": "https://ggobi.github.io/ggally/, https://github.com/ggobi/ggally", + "BugReports": "https://github.com/ggobi/ggally/issues", + "Authors@R": "c( person(\"Barret\", \"Schloerke\", role = c(\"aut\", \"cre\"), email = \"schloerke@gmail.com\"), person(\"Di\", \"Cook\", role = c(\"aut\", \"ths\"), email = \"dicook@monash.edu\"), person(\"Joseph\", \"Larmarange\", role = \"aut\", email = \"joseph@larmarange.net\"), person(\"Francois\", \"Briatte\", role = \"aut\", email = \"f.briatte@gmail.com\"), person(\"Moritz\", \"Marbach\", role = \"aut\", email = \"mmarbach@mail.uni-mannheim.de\"), person(\"Edwin\", \"Thoen\", role = \"aut\", email = \"edwinthoen@gmail.com\"), person(\"Amos\", \"Elberg\", role = \"aut\", email = \"amos.elberg@gmail.com\"), person(\"Ott\", \"Toomet\", role = \"ctb\", email = \"otoomet@gmail.com\"), person(\"Jason\", \"Crowley\", role = \"aut\", email = \"crowley.jason.s@gmail.com\"), person(\"Heike\", \"Hofmann\", role = \"ths\", email = \"hofmann@iastate.edu\"), person(\"Hadley\", \"Wickham\", role = \"ths\", email = \"h.wickham@gmail.com\") )", + "Description": "The R package 'ggplot2' is a plotting system based on the grammar of graphics. 'GGally' extends 'ggplot2' by adding several functions to reduce the complexity of combining geometric objects with transformed data. Some of these functions include a pairwise plot matrix, a two group pairwise plot matrix, a parallel coordinates plot, a survival plot, and several functions to plot networks.", + "Depends": [ + "R (>= 3.1)", + "ggplot2 (>= 3.4.4)" + ], + "Imports": [ + "dplyr (>= 1.0.0)", + "tidyr (>= 1.3.0)", + "grDevices", + "grid", + "ggstats", + "gtable (>= 0.2.0)", "lifecycle", - "plyr", + "plyr (>= 1.8.3)", "progress", - "reshape", + "RColorBrewer", "rlang", - "scales", - "tidyr" - ] - }, - "GithubMetrics": { - "Package": "GithubMetrics", - "Version": "0.5.0", - "Source": "GitHub", - "RemoteType": "github", - "RemoteHost": "api.github.com", - "RemoteRepo": "GithubMetrics", - "RemoteUsername": "openpharma", - "RemoteRef": "HEAD", - "RemoteSha": "0c60884923855e6b1f6b25e923212094e218662e", - "Hash": "b66f33c6bbe7ad2600eca79a6290b441", - "Requirements": [ - "base64enc", - "dplyr", - "gh", - "ghql", - "glue", - "lubridate", - "magrittr", - "pander", - "progress", - "purrr", - "tibble" - ] + "scales (>= 1.1.0)", + "utils", + "magrittr" + ], + "Suggests": [ + "broom (>= 0.7.0)", + "broom.helpers (>= 1.3.0)", + "chemometrics", + "geosphere (>= 1.5-1)", + "ggforce", + "Hmisc", + "igraph (>= 1.0.1)", + "intergraph (>= 2.0-2)", + "labelled", + "maps (>= 3.1.0)", + "mapproj", + "nnet", + "network (>= 1.17.1)", + "scagnostics", + "sna (>= 2.3-2)", + "survival", + "rmarkdown", + "roxygen2", + "testthat", + "crosstalk", + "knitr", + "spelling", + "emmeans", + "vdiffr" + ], + "RoxygenNote": "7.3.1", + "SystemRequirements": "openssl", + "Encoding": "UTF-8", + "Language": "en-US", + "RdMacros": "lifecycle", + "Config/testthat/edition": "3", + "NeedsCompilation": "no", + "Author": "Barret Schloerke [aut, cre], Di Cook [aut, ths], Joseph Larmarange [aut], Francois Briatte [aut], Moritz Marbach [aut], Edwin Thoen [aut], Amos Elberg [aut], Ott Toomet [ctb], Jason Crowley [aut], Heike Hofmann [ths], Hadley Wickham [ths]", + "Maintainer": "Barret Schloerke ", + "Repository": "CRAN" }, "IDEAFilter": { "Package": "IDEAFilter", - "Version": "0.1.2", + "Version": "0.2.0", "Source": "Repository", - "Repository": "CRAN", - "Hash": "710e9b55aed4449b06ea1ab403dd0899", - "Requirements": [ - "RColorBrewer", + "Type": "Package", + "Title": "Agnostic, Idiomatic Data Filter Module for Shiny", + "Description": "When added to an existing shiny app, users may subset any developer-chosen R data.frame on the fly. That is, users are empowered to slice & dice data by applying multiple (order specific) filters using the AND (&) operator between each, and getting real-time updates on the number of rows effected/available along the way. Thus, any downstream processes that leverage this data source (like tables, plots, or statistical procedures) will re-render after new filters are applied. The shiny module’s user interface has a 'minimalist' aesthetic so that the focus can be on the data & other visuals. In addition to returning a reactive (filtered) data.frame, 'IDEAFilter' as also returns 'dplyr' filter statements used to actually slice the data.", + "Authors@R": "c( person( given = \"Aaron\", family = \"Clark\", email = \"clark.aaronchris@gmail.com\", role = c(\"aut\", \"cre\"), comment = c(ORCID = \"0000-0002-0123-0970\")), person( given = \"Jeff\", family = \"Thompson\", email = \"jeff.thompson51317@gmail.com\", role = \"aut\"), person( given = \"Doug\", family = \"Kelkhoff\", email = \"doug.kelkhoff@gmail.com\", role = c(\"ctb\", \"cph\"), comment = \"Author of shinyDataFilter\"), person( given = \"Maya\", family = \"Gans\", email = \"maya.gans@biogen.com\", role = \"ctb\"), person(family = \"SortableJS contributors\", role = \"ctb\", comment = \"SortableJS library\"), person(given = \"Biogen\", role = \"cph\"))", + "License": "MIT + file LICENSE", + "URL": "https://biogen-inc.github.io/IDEAFilter/, https://github.com/Biogen-Inc/IDEAFilter", + "BugReports": "https://github.com/Biogen-Inc/IDEAFilter/issues", + "Encoding": "UTF-8", + "RoxygenNote": "7.3.1", + "Imports": [ "crayon", "ggplot2", - "pillar", + "pillar (>= 1.5.0)", "purrr", + "RColorBrewer", "shiny", "shinyTime" - ] + ], + "Suggests": [ + "dplyr", + "knitr", + "rmarkdown", + "shinytest", + "shinytest2", + "spelling", + "testthat" + ], + "Language": "en-US", + "VignetteBuilder": "knitr", + "Depends": [ + "R (>= 2.10)" + ], + "NeedsCompilation": "no", + "Author": "Aaron Clark [aut, cre] (), Jeff Thompson [aut], Doug Kelkhoff [ctb, cph] (Author of shinyDataFilter), Maya Gans [ctb], SortableJS contributors [ctb] (SortableJS library), Biogen [cph]", + "Maintainer": "Aaron Clark ", + "Repository": "CRAN" }, "MASS": { "Package": "MASS", - "Version": "7.3-58.2", - "Source": "Repository", - "Repository": "RSPM", - "Hash": "e02d1a0f6122fd3e634b25b433704344", - "Requirements": [] + "Version": "7.3-65", + "Source": "Repository", + "Priority": "recommended", + "Date": "2025-02-19", + "Revision": "$Rev: 3681 $", + "Depends": [ + "R (>= 4.4.0)", + "grDevices", + "graphics", + "stats", + "utils" + ], + "Imports": [ + "methods" + ], + "Suggests": [ + "lattice", + "nlme", + "nnet", + "survival" + ], + "Authors@R": "c(person(\"Brian\", \"Ripley\", role = c(\"aut\", \"cre\", \"cph\"), email = \"Brian.Ripley@R-project.org\"), person(\"Bill\", \"Venables\", role = c(\"aut\", \"cph\")), person(c(\"Douglas\", \"M.\"), \"Bates\", role = \"ctb\"), person(\"Kurt\", \"Hornik\", role = \"trl\", comment = \"partial port ca 1998\"), person(\"Albrecht\", \"Gebhardt\", role = \"trl\", comment = \"partial port ca 1998\"), person(\"David\", \"Firth\", role = \"ctb\", comment = \"support functions for polr\"))", + "Description": "Functions and datasets to support Venables and Ripley, \"Modern Applied Statistics with S\" (4th edition, 2002).", + "Title": "Support Functions and Datasets for Venables and Ripley's MASS", + "LazyData": "yes", + "ByteCompile": "yes", + "License": "GPL-2 | GPL-3", + "URL": "http://www.stats.ox.ac.uk/pub/MASS4/", + "Contact": "", + "NeedsCompilation": "yes", + "Author": "Brian Ripley [aut, cre, cph], Bill Venables [aut, cph], Douglas M. Bates [ctb], Kurt Hornik [trl] (partial port ca 1998), Albrecht Gebhardt [trl] (partial port ca 1998), David Firth [ctb] (support functions for polr)", + "Maintainer": "Brian Ripley ", + "Repository": "CRAN", + "Encoding": "UTF-8" }, "Matrix": { "Package": "Matrix", - "Version": "1.5-3", - "Source": "Repository", - "Repository": "CRAN", - "Hash": "4006dffe49958d2dd591c17e61e60591", - "Requirements": [ - "lattice" - ] + "Version": "1.7-3", + "Source": "Repository", + "VersionNote": "do also bump src/version.h, inst/include/Matrix/version.h", + "Date": "2025-03-05", + "Priority": "recommended", + "Title": "Sparse and Dense Matrix Classes and Methods", + "Description": "A rich hierarchy of sparse and dense matrix classes, including general, symmetric, triangular, and diagonal matrices with numeric, logical, or pattern entries. Efficient methods for operating on such matrices, often wrapping the 'BLAS', 'LAPACK', and 'SuiteSparse' libraries.", + "License": "GPL (>= 2) | file LICENCE", + "URL": "https://Matrix.R-forge.R-project.org", + "BugReports": "https://R-forge.R-project.org/tracker/?atid=294&group_id=61", + "Contact": "Matrix-authors@R-project.org", + "Authors@R": "c(person(\"Douglas\", \"Bates\", role = \"aut\", comment = c(ORCID = \"0000-0001-8316-9503\")), person(\"Martin\", \"Maechler\", role = c(\"aut\", \"cre\"), email = \"mmaechler+Matrix@gmail.com\", comment = c(ORCID = \"0000-0002-8685-9910\")), person(\"Mikael\", \"Jagan\", role = \"aut\", comment = c(ORCID = \"0000-0002-3542-2938\")), person(\"Timothy A.\", \"Davis\", role = \"ctb\", comment = c(ORCID = \"0000-0001-7614-6899\", \"SuiteSparse libraries\", \"collaborators listed in dir(system.file(\\\"doc\\\", \\\"SuiteSparse\\\", package=\\\"Matrix\\\"), pattern=\\\"License\\\", full.names=TRUE, recursive=TRUE)\")), person(\"George\", \"Karypis\", role = \"ctb\", comment = c(ORCID = \"0000-0003-2753-1437\", \"METIS library\", \"Copyright: Regents of the University of Minnesota\")), person(\"Jason\", \"Riedy\", role = \"ctb\", comment = c(ORCID = \"0000-0002-4345-4200\", \"GNU Octave's condest() and onenormest()\", \"Copyright: Regents of the University of California\")), person(\"Jens\", \"Oehlschlägel\", role = \"ctb\", comment = \"initial nearPD()\"), person(\"R Core Team\", role = \"ctb\", comment = c(ROR = \"02zz1nj61\", \"base R's matrix implementation\")))", + "Depends": [ + "R (>= 4.4)", + "methods" + ], + "Imports": [ + "grDevices", + "graphics", + "grid", + "lattice", + "stats", + "utils" + ], + "Suggests": [ + "MASS", + "datasets", + "sfsmisc", + "tools" + ], + "Enhances": [ + "SparseM", + "graph" + ], + "LazyData": "no", + "LazyDataNote": "not possible, since we use data/*.R and our S4 classes", + "BuildResaveData": "no", + "Encoding": "UTF-8", + "NeedsCompilation": "yes", + "Author": "Douglas Bates [aut] (), Martin Maechler [aut, cre] (), Mikael Jagan [aut] (), Timothy A. Davis [ctb] (, SuiteSparse libraries, collaborators listed in dir(system.file(\"doc\", \"SuiteSparse\", package=\"Matrix\"), pattern=\"License\", full.names=TRUE, recursive=TRUE)), George Karypis [ctb] (, METIS library, Copyright: Regents of the University of Minnesota), Jason Riedy [ctb] (, GNU Octave's condest() and onenormest(), Copyright: Regents of the University of California), Jens Oehlschlägel [ctb] (initial nearPD()), R Core Team [ctb] (02zz1nj61, base R's matrix implementation)", + "Maintainer": "Martin Maechler ", + "Repository": "CRAN" }, "R6": { "Package": "R6", - "Version": "2.5.1", - "Source": "Repository", - "Repository": "CRAN", - "Hash": "470851b6d5d0ac559e9d01bb352b4021", - "Requirements": [] + "Version": "2.6.1", + "Source": "Repository", + "Title": "Encapsulated Classes with Reference Semantics", + "Authors@R": "c( person(\"Winston\", \"Chang\", , \"winston@posit.co\", role = c(\"aut\", \"cre\")), person(\"Posit Software, PBC\", role = c(\"cph\", \"fnd\")) )", + "Description": "Creates classes with reference semantics, similar to R's built-in reference classes. Compared to reference classes, R6 classes are simpler and lighter-weight, and they are not built on S4 classes so they do not require the methods package. These classes allow public and private members, and they support inheritance, even when the classes are defined in different packages.", + "License": "MIT + file LICENSE", + "URL": "https://r6.r-lib.org, https://github.com/r-lib/R6", + "BugReports": "https://github.com/r-lib/R6/issues", + "Depends": [ + "R (>= 3.6)" + ], + "Suggests": [ + "lobstr", + "testthat (>= 3.0.0)" + ], + "Config/Needs/website": "tidyverse/tidytemplate, ggplot2, microbenchmark, scales", + "Config/testthat/edition": "3", + "Encoding": "UTF-8", + "RoxygenNote": "7.3.2", + "NeedsCompilation": "no", + "Author": "Winston Chang [aut, cre], Posit Software, PBC [cph, fnd]", + "Maintainer": "Winston Chang ", + "Repository": "CRAN" }, "RColorBrewer": { "Package": "RColorBrewer", "Version": "1.1-3", "Source": "Repository", - "Repository": "CRAN", - "Hash": "45f0398006e83a5b10b72a90663d8d8c", - "Requirements": [] + "Date": "2022-04-03", + "Title": "ColorBrewer Palettes", + "Authors@R": "c(person(given = \"Erich\", family = \"Neuwirth\", role = c(\"aut\", \"cre\"), email = \"erich.neuwirth@univie.ac.at\"))", + "Author": "Erich Neuwirth [aut, cre]", + "Maintainer": "Erich Neuwirth ", + "Depends": [ + "R (>= 2.0.0)" + ], + "Description": "Provides color schemes for maps (and other graphics) designed by Cynthia Brewer as described at http://colorbrewer2.org.", + "License": "Apache License 2.0", + "NeedsCompilation": "no", + "Repository": "RSPM", + "Encoding": "UTF-8" }, "Rcpp": { "Package": "Rcpp", - "Version": "1.0.10", - "Source": "Repository", - "Repository": "RSPM", - "Hash": "e749cae40fa9ef469b6050959517453c", - "Requirements": [] + "Version": "1.0.14", + "Source": "Repository", + "Title": "Seamless R and C++ Integration", + "Date": "2025-01-11", + "Authors@R": "c(person(\"Dirk\", \"Eddelbuettel\", role = c(\"aut\", \"cre\"), email = \"edd@debian.org\", comment = c(ORCID = \"0000-0001-6419-907X\")), person(\"Romain\", \"Francois\", role = \"aut\", comment = c(ORCID = \"0000-0002-2444-4226\")), person(\"JJ\", \"Allaire\", role = \"aut\", comment = c(ORCID = \"0000-0003-0174-9868\")), person(\"Kevin\", \"Ushey\", role = \"aut\", comment = c(ORCID = \"0000-0003-2880-7407\")), person(\"Qiang\", \"Kou\", role = \"aut\", comment = c(ORCID = \"0000-0001-6786-5453\")), person(\"Nathan\", \"Russell\", role = \"aut\"), person(\"Iñaki\", \"Ucar\", role = \"aut\", comment = c(ORCID = \"0000-0001-6403-5550\")), person(\"Doug\", \"Bates\", role = \"aut\", comment = c(ORCID = \"0000-0001-8316-9503\")), person(\"John\", \"Chambers\", role = \"aut\"))", + "Description": "The 'Rcpp' package provides R functions as well as C++ classes which offer a seamless integration of R and C++. Many R data types and objects can be mapped back and forth to C++ equivalents which facilitates both writing of new code as well as easier integration of third-party libraries. Documentation about 'Rcpp' is provided by several vignettes included in this package, via the 'Rcpp Gallery' site at , the paper by Eddelbuettel and Francois (2011, ), the book by Eddelbuettel (2013, ) and the paper by Eddelbuettel and Balamuta (2018, ); see 'citation(\"Rcpp\")' for details.", + "Imports": [ + "methods", + "utils" + ], + "Suggests": [ + "tinytest", + "inline", + "rbenchmark", + "pkgKitten (>= 0.1.2)" + ], + "URL": "https://www.rcpp.org, https://dirk.eddelbuettel.com/code/rcpp.html, https://github.com/RcppCore/Rcpp", + "License": "GPL (>= 2)", + "BugReports": "https://github.com/RcppCore/Rcpp/issues", + "MailingList": "rcpp-devel@lists.r-forge.r-project.org", + "RoxygenNote": "6.1.1", + "Encoding": "UTF-8", + "NeedsCompilation": "yes", + "Author": "Dirk Eddelbuettel [aut, cre] (), Romain Francois [aut] (), JJ Allaire [aut] (), Kevin Ushey [aut] (), Qiang Kou [aut] (), Nathan Russell [aut], Iñaki Ucar [aut] (), Doug Bates [aut] (), John Chambers [aut]", + "Maintainer": "Dirk Eddelbuettel ", + "Repository": "CRAN" }, "V8": { "Package": "V8", - "Version": "4.2.2", - "Source": "Repository", - "Repository": "RSPM", - "Hash": "ebee37dadb0a8f5086663825d2c33076", - "Requirements": [ - "Rcpp", - "curl", - "jsonlite" - ] - }, - "anytime": { - "Package": "anytime", - "Version": "0.3.9", - "Source": "Repository", - "Repository": "CRAN", - "Hash": "74a64813f17b492da9c6afda6b128e3d", - "Requirements": [ - "BH", + "Version": "6.0.3", + "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.", + "License": "MIT + file LICENSE", + "URL": "https://jeroen.r-universe.dev/V8", + "BugReports": "https://github.com/jeroen/v8/issues", + "SystemRequirements": "V8 engine version 6+ is needed for ES6 and WASM support. On Linux you can build against libv8-dev (Debian) or v8-devel (Fedora). We also provide static libv8 binaries for most platforms, see the README for details.", + "NeedsCompilation": "yes", + "VignetteBuilder": "knitr", + "Imports": [ + "Rcpp (>= 0.12.12)", + "jsonlite (>= 1.0)", + "curl (>= 1.0)", + "utils" + ], + "LinkingTo": [ "Rcpp" - ] + ], + "Suggests": [ + "testthat", + "knitr", + "rmarkdown" + ], + "RoxygenNote": "7.3.1", + "Language": "en-US", + "Encoding": "UTF-8", + "Biarch": "true", + "Author": "Jeroen Ooms [aut, cre] (), Jan Marvin Garbuszus [ctb]", + "Maintainer": "Jeroen Ooms ", + "Repository": "CRAN" + }, + "arrow": { + "Package": "arrow", + "Version": "20.0.0.2", + "Source": "Repository", + "Title": "Integration to 'Apache' 'Arrow'", + "Authors@R": "c( person(\"Neal\", \"Richardson\", email = \"neal.p.richardson@gmail.com\", role = c(\"aut\")), person(\"Ian\", \"Cook\", email = \"ianmcook@gmail.com\", role = c(\"aut\")), person(\"Nic\", \"Crane\", email = \"thisisnic@gmail.com\", role = c(\"aut\")), person(\"Dewey\", \"Dunnington\", role = c(\"aut\"), email = \"dewey@fishandwhistle.net\", comment = c(ORCID = \"0000-0002-9415-4582\")), person(\"Romain\", \"Fran\\u00e7ois\", role = c(\"aut\"), comment = c(ORCID = \"0000-0002-2444-4226\")), person(\"Jonathan\", \"Keane\", email = \"jkeane@gmail.com\", role = c(\"aut\", \"cre\")), person(\"Drago\\u0219\", \"Moldovan-Gr\\u00fcnfeld\", email = \"dragos.mold@gmail.com\", role = c(\"aut\")), person(\"Jeroen\", \"Ooms\", email = \"jeroen@berkeley.edu\", role = c(\"aut\")), person(\"Jacob\", \"Wujciak-Jens\", email = \"jacob@wujciak.de\", role = c(\"aut\")), person(\"Javier\", \"Luraschi\", email = \"javier@rstudio.com\", role = c(\"ctb\")), person(\"Karl\", \"Dunkle Werner\", email = \"karldw@users.noreply.github.com\", role = c(\"ctb\"), comment = c(ORCID = \"0000-0003-0523-7309\")), person(\"Jeffrey\", \"Wong\", email = \"jeffreyw@netflix.com\", role = c(\"ctb\")), person(\"Apache Arrow\", email = \"dev@arrow.apache.org\", role = c(\"aut\", \"cph\")) )", + "Description": "'Apache' 'Arrow' is a cross-language development platform for in-memory data. It specifies a standardized language-independent columnar memory format for flat and hierarchical data, organized for efficient analytic operations on modern hardware. This package provides an interface to the 'Arrow C++' library.", + "Depends": [ + "R (>= 4.0)" + ], + "License": "Apache License (>= 2.0)", + "URL": "https://github.com/apache/arrow/, https://arrow.apache.org/docs/r/", + "BugReports": "https://github.com/apache/arrow/issues", + "Encoding": "UTF-8", + "Language": "en-US", + "SystemRequirements": "C++17; for AWS S3 support on Linux, libcurl and openssl (optional); cmake >= 3.16 (build-time only, and only for full source build)", + "Biarch": "true", + "Imports": [ + "assertthat", + "bit64 (>= 0.9-7)", + "glue", + "methods", + "purrr", + "R6", + "rlang (>= 1.0.0)", + "stats", + "tidyselect (>= 1.0.0)", + "utils", + "vctrs" + ], + "RoxygenNote": "7.3.2", + "Config/testthat/edition": "3", + "Config/build/bootstrap": "TRUE", + "Suggests": [ + "blob", + "curl", + "cli", + "DBI", + "dbplyr", + "decor", + "distro", + "dplyr", + "duckdb (>= 0.2.8)", + "hms", + "jsonlite", + "knitr", + "lubridate", + "pillar", + "pkgload", + "reticulate", + "rmarkdown", + "stringi", + "stringr", + "sys", + "testthat (>= 3.1.0)", + "tibble", + "tzdb", + "withr" + ], + "LinkingTo": [ + "cpp11 (>= 0.4.2)" + ], + "Collate": "'arrowExports.R' 'enums.R' 'arrow-object.R' 'type.R' 'array-data.R' 'arrow-datum.R' 'array.R' 'arrow-info.R' 'arrow-package.R' 'arrow-tabular.R' 'buffer.R' 'chunked-array.R' 'io.R' 'compression.R' 'scalar.R' 'compute.R' 'config.R' 'csv.R' 'dataset.R' 'dataset-factory.R' 'dataset-format.R' 'dataset-partition.R' 'dataset-scan.R' 'dataset-write.R' 'dictionary.R' 'dplyr-across.R' 'dplyr-arrange.R' 'dplyr-by.R' 'dplyr-collect.R' 'dplyr-count.R' 'dplyr-datetime-helpers.R' 'dplyr-distinct.R' 'dplyr-eval.R' 'dplyr-filter.R' 'dplyr-funcs-agg.R' 'dplyr-funcs-augmented.R' 'dplyr-funcs-conditional.R' 'dplyr-funcs-datetime.R' 'dplyr-funcs-doc.R' 'dplyr-funcs-math.R' 'dplyr-funcs-simple.R' 'dplyr-funcs-string.R' 'dplyr-funcs-type.R' 'expression.R' 'dplyr-funcs.R' 'dplyr-glimpse.R' 'dplyr-group-by.R' 'dplyr-join.R' 'dplyr-mutate.R' 'dplyr-select.R' 'dplyr-slice.R' 'dplyr-summarize.R' 'dplyr-union.R' 'record-batch.R' 'table.R' 'dplyr.R' 'duckdb.R' 'extension.R' 'feather.R' 'field.R' 'filesystem.R' 'flight.R' 'install-arrow.R' 'ipc-stream.R' 'json.R' 'memory-pool.R' 'message.R' 'metadata.R' 'parquet.R' 'python.R' 'query-engine.R' 'record-batch-reader.R' 'record-batch-writer.R' 'reexports-bit64.R' 'reexports-tidyselect.R' 'schema.R' 'udf.R' 'util.R'", + "NeedsCompilation": "yes", + "Author": "Neal Richardson [aut], Ian Cook [aut], Nic Crane [aut], Dewey Dunnington [aut] (ORCID: ), Romain François [aut] (ORCID: ), Jonathan Keane [aut, cre], Dragoș Moldovan-Grünfeld [aut], Jeroen Ooms [aut], Jacob Wujciak-Jens [aut], Javier Luraschi [ctb], Karl Dunkle Werner [ctb] (ORCID: ), Jeffrey Wong [ctb], Apache Arrow [aut, cph]", + "Maintainer": "Jonathan Keane ", + "Repository": "RSPM" }, "askpass": { "Package": "askpass", - "Version": "1.1", + "Version": "1.2.1", "Source": "Repository", - "Repository": "CRAN", - "Hash": "e8a22846fff485f0be3770c2da758713", - "Requirements": [ - "sys" - ] + "Type": "Package", + "Title": "Password Entry Utilities for R, Git, and SSH", + "Authors@R": "person(\"Jeroen\", \"Ooms\", role = c(\"aut\", \"cre\"), email = \"jeroenooms@gmail.com\", comment = c(ORCID = \"0000-0002-4035-0289\"))", + "Description": "Cross-platform utilities for prompting the user for credentials or a passphrase, for example to authenticate with a server or read a protected key. Includes native programs for MacOS and Windows, hence no 'tcltk' is required. Password entry can be invoked in two different ways: directly from R via the askpass() function, or indirectly as password-entry back-end for 'ssh-agent' or 'git-credential' via the SSH_ASKPASS and GIT_ASKPASS environment variables. Thereby the user can be prompted for credentials or a passphrase if needed when R calls out to git or ssh.", + "License": "MIT + file LICENSE", + "URL": "https://r-lib.r-universe.dev/askpass", + "BugReports": "https://github.com/r-lib/askpass/issues", + "Encoding": "UTF-8", + "Imports": [ + "sys (>= 2.1)" + ], + "RoxygenNote": "7.2.3", + "Suggests": [ + "testthat" + ], + "Language": "en-US", + "NeedsCompilation": "yes", + "Author": "Jeroen Ooms [aut, cre] ()", + "Maintainer": "Jeroen Ooms ", + "Repository": "RSPM" }, "assertthat": { "Package": "assertthat", "Version": "0.2.1", "Source": "Repository", - "Repository": "CRAN", - "Hash": "50c838a310445e954bc13f26f26a6ecf", - "Requirements": [] - }, - "attachment": { - "Package": "attachment", - "Version": "0.3.1", - "Source": "Repository", + "Title": "Easy Pre and Post Assertions", + "Authors@R": "person(\"Hadley\", \"Wickham\", , \"hadley@rstudio.com\", c(\"aut\", \"cre\"))", + "Description": "An extension to stopifnot() that makes it easy to declare the pre and post conditions that you code should satisfy, while also producing friendly error messages so that your users know what's gone wrong.", + "License": "GPL-3", + "Imports": [ + "tools" + ], + "Suggests": [ + "testthat", + "covr" + ], + "RoxygenNote": "6.0.1", + "Collate": "'assert-that.r' 'on-failure.r' 'assertions-file.r' 'assertions-scalar.R' 'assertions.r' 'base.r' 'base-comparison.r' 'base-is.r' 'base-logical.r' 'base-misc.r' 'utils.r' 'validate-that.R'", + "NeedsCompilation": "no", + "Author": "Hadley Wickham [aut, cre]", + "Maintainer": "Hadley Wickham ", "Repository": "RSPM", - "Hash": "f16bc1776a6dbe3716d0579cd4d47be2", - "Requirements": [ - "cli", - "desc", - "glue", - "knitr", - "magrittr", - "rmarkdown", - "roxygen2", - "stringr", - "withr" - ] + "Encoding": "UTF-8" }, "attempt": { "Package": "attempt", "Version": "0.3.1", "Source": "Repository", - "Repository": "CRAN", - "Hash": "d7421bb5dfeb2676b9e4a5a60c2fcfd2", - "Requirements": [ + "Title": "Tools for Defensive Programming", + "Authors@R": "person(\"Colin\", \"Fay\", email = \"contact@colinfay.me\", role = c(\"aut\", \"cre\"), comment=c(ORCID=\"0000-0001-7343-1846\"))", + "Description": "Tools for defensive programming, inspired by 'purrr' mappers and based on 'rlang'.'attempt' extends and facilitates defensive programming by providing a consistent grammar, and provides a set of easy to use functions for common tests and conditions. 'attempt' only depends on 'rlang', and focuses on speed, so it can be easily integrated in other functions and used in data analysis.", + "License": "MIT + file LICENSE", + "Encoding": "UTF-8", + "URL": "https://github.com/ColinFay/attempt", + "LazyData": "true", + "Suggests": [ + "testthat", + "knitr", + "rmarkdown", + "curl" + ], + "VignetteBuilder": "knitr", + "Imports": [ "rlang" - ] + ], + "RoxygenNote": "7.1.0", + "NeedsCompilation": "no", + "Author": "Colin Fay [aut, cre] ()", + "Maintainer": "Colin Fay ", + "Repository": "CRAN" }, "backports": { "Package": "backports", - "Version": "1.4.1", + "Version": "1.5.0", "Source": "Repository", - "Repository": "CRAN", - "Hash": "c39fbec8a30d23e721980b8afb31984c", - "Requirements": [] + "Type": "Package", + "Title": "Reimplementations of Functions Introduced Since R-3.0.0", + "Authors@R": "c( person(\"Michel\", \"Lang\", NULL, \"michellang@gmail.com\", role = c(\"cre\", \"aut\"), comment = c(ORCID = \"0000-0001-9754-0393\")), person(\"Duncan\", \"Murdoch\", NULL, \"murdoch.duncan@gmail.com\", role = c(\"aut\")), person(\"R Core Team\", role = \"aut\"))", + "Maintainer": "Michel Lang ", + "Description": "Functions introduced or changed since R v3.0.0 are re-implemented in this package. The backports are conditionally exported in order to let R resolve the function name to either the implemented backport, or the respective base version, if available. Package developers can make use of new functions or arguments by selectively importing specific backports to support older installations.", + "URL": "https://github.com/r-lib/backports", + "BugReports": "https://github.com/r-lib/backports/issues", + "License": "GPL-2 | GPL-3", + "NeedsCompilation": "yes", + "ByteCompile": "yes", + "Depends": [ + "R (>= 3.0.0)" + ], + "Encoding": "UTF-8", + "RoxygenNote": "7.3.1", + "Author": "Michel Lang [cre, aut] (), Duncan Murdoch [aut], R Core Team [aut]", + "Repository": "RSPM" }, "base64enc": { "Package": "base64enc", "Version": "0.1-3", "Source": "Repository", + "Title": "Tools for base64 encoding", + "Author": "Simon Urbanek ", + "Maintainer": "Simon Urbanek ", + "Depends": [ + "R (>= 2.9.0)" + ], + "Enhances": [ + "png" + ], + "Description": "This package provides tools for handling base64 encoding. It is more flexible than the orphaned base64 package.", + "License": "GPL-2 | GPL-3", + "URL": "http://www.rforge.net/base64enc", + "NeedsCompilation": "yes", "Repository": "CRAN", - "Hash": "543776ae6848fde2f48ff3816d0628bc", - "Requirements": [] + "Encoding": "UTF-8" }, "bigD": { "Package": "bigD", - "Version": "0.2.0", + "Version": "0.3.1", "Source": "Repository", - "Repository": "RSPM", - "Hash": "93637e906f3fe962413912c956eb44db", - "Requirements": [] + "Type": "Package", + "Title": "Flexibly Format Dates and Times to a Given Locale", + "Description": "Format dates and times flexibly and to whichever locales make sense. Parses dates, times, and date-times in various formats (including string-based ISO 8601 constructions). The formatting syntax gives the user many options for formatting the date and time output in a precise manner. Time zones in the input can be expressed in multiple ways and there are many options for formatting time zones in the output as well. Several of the provided helper functions allow for automatic generation of locale-aware formatting patterns based on date/time skeleton formats and standardized date/time formats with varying specificity.", + "Authors@R": "c( person(\"Richard\", \"Iannone\", , \"rich@posit.co\", role = c(\"aut\", \"cre\"), comment = c(ORCID = \"0000-0003-3925-190X\")), person(\"Olivier\", \"Roy\", role = \"ctb\"), person(\"Posit Software, PBC\", role = c(\"cph\", \"fnd\")) )", + "License": "MIT + file LICENSE", + "URL": "https://rstudio.github.io/bigD/, https://github.com/rstudio/bigD", + "BugReports": "https://github.com/rstudio/bigD/issues", + "Encoding": "UTF-8", + "RoxygenNote": "7.3.2", + "Depends": [ + "R (>= 3.6.0)" + ], + "Suggests": [ + "testthat (>= 3.0.0)", + "vctrs (>= 0.5.0)" + ], + "Config/testthat/edition": "3", + "Config/testthat/parallel": "true", + "NeedsCompilation": "no", + "Author": "Richard Iannone [aut, cre] (), Olivier Roy [ctb], Posit Software, PBC [cph, fnd]", + "Maintainer": "Richard Iannone ", + "Repository": "CRAN" }, "bit": { "Package": "bit", - "Version": "4.0.5", - "Source": "Repository", - "Repository": "CRAN", - "Hash": "d242abec29412ce988848d0294b208fd", - "Requirements": [] + "Version": "4.6.0", + "Source": "Repository", + "Title": "Classes and Methods for Fast Memory-Efficient Boolean Selections", + "Authors@R": "c( person(\"Michael\", \"Chirico\", email = \"MichaelChirico4@gmail.com\", role = c(\"aut\", \"cre\")), person(\"Jens\", \"Oehlschlägel\", role = \"aut\"), person(\"Brian\", \"Ripley\", role = \"ctb\") )", + "Depends": [ + "R (>= 3.4.0)" + ], + "Suggests": [ + "testthat (>= 3.0.0)", + "roxygen2", + "knitr", + "markdown", + "rmarkdown", + "microbenchmark", + "bit64 (>= 4.0.0)", + "ff (>= 4.0.0)" + ], + "Description": "Provided are classes for boolean and skewed boolean vectors, fast boolean methods, fast unique and non-unique integer sorting, fast set operations on sorted and unsorted sets of integers, and foundations for ff (range index, compression, chunked processing).", + "License": "GPL-2 | GPL-3", + "LazyLoad": "yes", + "ByteCompile": "yes", + "Encoding": "UTF-8", + "URL": "https://github.com/r-lib/bit", + "VignetteBuilder": "knitr, rmarkdown", + "RoxygenNote": "7.3.2", + "Config/testthat/edition": "3", + "NeedsCompilation": "yes", + "Author": "Michael Chirico [aut, cre], Jens Oehlschlägel [aut], Brian Ripley [ctb]", + "Maintainer": "Michael Chirico ", + "Repository": "RSPM" }, "bit64": { "Package": "bit64", - "Version": "4.0.5", - "Source": "Repository", - "Repository": "CRAN", - "Hash": "9fe98599ca456d6552421db0d6772d8f", - "Requirements": [ - "bit" - ] + "Version": "4.6.0-1", + "Source": "Repository", + "Title": "A S3 Class for Vectors of 64bit Integers", + "Authors@R": "c( person(\"Michael\", \"Chirico\", email = \"michaelchirico4@gmail.com\", role = c(\"aut\", \"cre\")), person(\"Jens\", \"Oehlschlägel\", role = \"aut\"), person(\"Leonardo\", \"Silvestri\", role = \"ctb\"), person(\"Ofek\", \"Shilon\", role = \"ctb\") )", + "Depends": [ + "R (>= 3.4.0)", + "bit (>= 4.0.0)" + ], + "Description": "Package 'bit64' provides serializable S3 atomic 64bit (signed) integers. These are useful for handling database keys and exact counting in +-2^63. WARNING: do not use them as replacement for 32bit integers, integer64 are not supported for subscripting by R-core and they have different semantics when combined with double, e.g. integer64 + double => integer64. Class integer64 can be used in vectors, matrices, arrays and data.frames. Methods are available for coercion from and to logicals, integers, doubles, characters and factors as well as many elementwise and summary functions. Many fast algorithmic operations such as 'match' and 'order' support inter- active data exploration and manipulation and optionally leverage caching.", + "License": "GPL-2 | GPL-3", + "LazyLoad": "yes", + "ByteCompile": "yes", + "URL": "https://github.com/r-lib/bit64", + "Encoding": "UTF-8", + "Imports": [ + "graphics", + "methods", + "stats", + "utils" + ], + "Suggests": [ + "testthat (>= 3.0.3)", + "withr" + ], + "Config/testthat/edition": "3", + "Config/needs/development": "testthat", + "RoxygenNote": "7.3.2", + "NeedsCompilation": "yes", + "Author": "Michael Chirico [aut, cre], Jens Oehlschlägel [aut], Leonardo Silvestri [ctb], Ofek Shilon [ctb]", + "Maintainer": "Michael Chirico ", + "Repository": "RSPM" }, "bitops": { "Package": "bitops", - "Version": "1.0-7", - "Source": "Repository", - "Repository": "CRAN", - "Hash": "b7d8d8ee39869c18d8846a184dd8a1af", - "Requirements": [] - }, - "brew": { - "Package": "brew", - "Version": "1.0-8", - "Source": "Repository", - "Repository": "RSPM", - "Hash": "d69a786e85775b126bddbee185ae6084", - "Requirements": [] - }, - "brio": { - "Package": "brio", - "Version": "1.1.3", - "Source": "Repository", + "Version": "1.0-9", + "Source": "Repository", + "Date": "2024-10-03", + "Authors@R": "c( person(\"Steve\", \"Dutky\", role = \"aut\", email = \"sdutky@terpalum.umd.edu\", comment = \"S original; then (after MM's port) revised and modified\"), person(\"Martin\", \"Maechler\", role = c(\"cre\", \"aut\"), email = \"maechler@stat.math.ethz.ch\", comment = c(\"Initial R port; tweaks\", ORCID = \"0000-0002-8685-9910\")))", + "Title": "Bitwise Operations", + "Description": "Functions for bitwise operations on integer vectors.", + "License": "GPL (>= 2)", + "URL": "https://github.com/mmaechler/R-bitops", + "BugReports": "https://github.com/mmaechler/R-bitops/issues", + "NeedsCompilation": "yes", + "Author": "Steve Dutky [aut] (S original; then (after MM's port) revised and modified), Martin Maechler [cre, aut] (Initial R port; tweaks, )", + "Maintainer": "Martin Maechler ", "Repository": "CRAN", - "Hash": "976cf154dfb043c012d87cddd8bca363", - "Requirements": [] + "Encoding": "UTF-8" + }, + "broom": { + "Package": "broom", + "Version": "1.0.8", + "Source": "Repository", + "Type": "Package", + "Title": "Convert Statistical Objects into Tidy Tibbles", + "Authors@R": "c(person(given = \"David\", family = \"Robinson\", role = \"aut\", email = \"admiral.david@gmail.com\"), person(given = \"Alex\", family = \"Hayes\", role = \"aut\", email = \"alexpghayes@gmail.com\", comment = c(ORCID = \"0000-0002-4985-5160\")), person(given = \"Simon\", family = \"Couch\", role = c(\"aut\", \"cre\"), email = \"simon.couch@posit.co\", comment = c(ORCID = \"0000-0001-5676-5107\")), person(given = \"Posit Software, PBC\", role = c(\"cph\", \"fnd\")), person(given = \"Indrajeet\", family = \"Patil\", role = \"ctb\", email = \"patilindrajeet.science@gmail.com\", comment = c(ORCID = \"0000-0003-1995-6531\")), person(given = \"Derek\", family = \"Chiu\", role = \"ctb\", email = \"dchiu@bccrc.ca\"), person(given = \"Matthieu\", family = \"Gomez\", role = \"ctb\", email = \"mattg@princeton.edu\"), person(given = \"Boris\", family = \"Demeshev\", role = \"ctb\", email = \"boris.demeshev@gmail.com\"), person(given = \"Dieter\", family = \"Menne\", role = \"ctb\", email = \"dieter.menne@menne-biomed.de\"), person(given = \"Benjamin\", family = \"Nutter\", role = \"ctb\", email = \"nutter@battelle.org\"), person(given = \"Luke\", family = \"Johnston\", role = \"ctb\", email = \"luke.johnston@mail.utoronto.ca\"), person(given = \"Ben\", family = \"Bolker\", role = \"ctb\", email = \"bolker@mcmaster.ca\"), person(given = \"Francois\", family = \"Briatte\", role = \"ctb\", email = \"f.briatte@gmail.com\"), person(given = \"Jeffrey\", family = \"Arnold\", role = \"ctb\", email = \"jeffrey.arnold@gmail.com\"), person(given = \"Jonah\", family = \"Gabry\", role = \"ctb\", email = \"jsg2201@columbia.edu\"), person(given = \"Luciano\", family = \"Selzer\", role = \"ctb\", email = \"luciano.selzer@gmail.com\"), person(given = \"Gavin\", family = \"Simpson\", role = \"ctb\", email = \"ucfagls@gmail.com\"), person(given = \"Jens\", family = \"Preussner\", role = \"ctb\", email = \" jens.preussner@mpi-bn.mpg.de\"), person(given = \"Jay\", family = \"Hesselberth\", role = \"ctb\", email = \"jay.hesselberth@gmail.com\"), person(given = \"Hadley\", family = \"Wickham\", role = \"ctb\", email = \"hadley@posit.co\"), person(given = \"Matthew\", family = \"Lincoln\", role = \"ctb\", email = \"matthew.d.lincoln@gmail.com\"), person(given = \"Alessandro\", family = \"Gasparini\", role = \"ctb\", email = \"ag475@leicester.ac.uk\"), person(given = \"Lukasz\", family = \"Komsta\", role = \"ctb\", email = \"lukasz.komsta@umlub.pl\"), person(given = \"Frederick\", family = \"Novometsky\", role = \"ctb\"), person(given = \"Wilson\", family = \"Freitas\", role = \"ctb\"), person(given = \"Michelle\", family = \"Evans\", role = \"ctb\"), person(given = \"Jason Cory\", family = \"Brunson\", role = \"ctb\", email = \"cornelioid@gmail.com\"), person(given = \"Simon\", family = \"Jackson\", role = \"ctb\", email = \"drsimonjackson@gmail.com\"), person(given = \"Ben\", family = \"Whalley\", role = \"ctb\", email = \"ben.whalley@plymouth.ac.uk\"), person(given = \"Karissa\", family = \"Whiting\", role = \"ctb\", email = \"karissa.whiting@gmail.com\"), person(given = \"Yves\", family = \"Rosseel\", role = \"ctb\", email = \"yrosseel@gmail.com\"), person(given = \"Michael\", family = \"Kuehn\", role = \"ctb\", email = \"mkuehn10@gmail.com\"), person(given = \"Jorge\", family = \"Cimentada\", role = \"ctb\", email = \"cimentadaj@gmail.com\"), person(given = \"Erle\", family = \"Holgersen\", role = \"ctb\", email = \"erle.holgersen@gmail.com\"), person(given = \"Karl\", family = \"Dunkle Werner\", role = \"ctb\", comment = c(ORCID = \"0000-0003-0523-7309\")), person(given = \"Ethan\", family = \"Christensen\", role = \"ctb\", email = \"christensen.ej@gmail.com\"), person(given = \"Steven\", family = \"Pav\", role = \"ctb\", email = \"shabbychef@gmail.com\"), person(given = \"Paul\", family = \"PJ\", role = \"ctb\", email = \"pjpaul.stephens@gmail.com\"), person(given = \"Ben\", family = \"Schneider\", role = \"ctb\", email = \"benjamin.julius.schneider@gmail.com\"), person(given = \"Patrick\", family = \"Kennedy\", role = \"ctb\", email = \"pkqstr@protonmail.com\"), person(given = \"Lily\", family = \"Medina\", role = \"ctb\", email = \"lilymiru@gmail.com\"), person(given = \"Brian\", family = \"Fannin\", role = \"ctb\", email = \"captain@pirategrunt.com\"), person(given = \"Jason\", family = \"Muhlenkamp\", role = \"ctb\", email = \"jason.muhlenkamp@gmail.com\"), person(given = \"Matt\", family = \"Lehman\", role = \"ctb\"), person(given = \"Bill\", family = \"Denney\", role = \"ctb\", email = \"wdenney@humanpredictions.com\", comment = c(ORCID = \"0000-0002-5759-428X\")), person(given = \"Nic\", family = \"Crane\", role = \"ctb\"), person(given = \"Andrew\", family = \"Bates\", role = \"ctb\"), person(given = \"Vincent\", family = \"Arel-Bundock\", role = \"ctb\", email = \"vincent.arel-bundock@umontreal.ca\", comment = c(ORCID = \"0000-0003-2042-7063\")), person(given = \"Hideaki\", family = \"Hayashi\", role = \"ctb\"), person(given = \"Luis\", family = \"Tobalina\", role = \"ctb\"), person(given = \"Annie\", family = \"Wang\", role = \"ctb\", email = \"anniewang.uc@gmail.com\"), person(given = \"Wei Yang\", family = \"Tham\", role = \"ctb\", email = \"weiyang.tham@gmail.com\"), person(given = \"Clara\", family = \"Wang\", role = \"ctb\", email = \"clara.wang.94@gmail.com\"), person(given = \"Abby\", family = \"Smith\", role = \"ctb\", email = \"als1@u.northwestern.edu\", comment = c(ORCID = \"0000-0002-3207-0375\")), person(given = \"Jasper\", family = \"Cooper\", role = \"ctb\", email = \"jaspercooper@gmail.com\", comment = c(ORCID = \"0000-0002-8639-3188\")), person(given = \"E Auden\", family = \"Krauska\", role = \"ctb\", email = \"krauskae@gmail.com\", comment = c(ORCID = \"0000-0002-1466-5850\")), person(given = \"Alex\", family = \"Wang\", role = \"ctb\", email = \"x249wang@uwaterloo.ca\"), person(given = \"Malcolm\", family = \"Barrett\", role = \"ctb\", email = \"malcolmbarrett@gmail.com\", comment = c(ORCID = \"0000-0003-0299-5825\")), person(given = \"Charles\", family = \"Gray\", role = \"ctb\", email = \"charlestigray@gmail.com\", comment = c(ORCID = \"0000-0002-9978-011X\")), person(given = \"Jared\", family = \"Wilber\", role = \"ctb\"), person(given = \"Vilmantas\", family = \"Gegzna\", role = \"ctb\", email = \"GegznaV@gmail.com\", comment = c(ORCID = \"0000-0002-9500-5167\")), person(given = \"Eduard\", family = \"Szoecs\", role = \"ctb\", email = \"eduardszoecs@gmail.com\"), person(given = \"Frederik\", family = \"Aust\", role = \"ctb\", email = \"frederik.aust@uni-koeln.de\", comment = c(ORCID = \"0000-0003-4900-788X\")), person(given = \"Angus\", family = \"Moore\", role = \"ctb\", email = \"angusmoore9@gmail.com\"), person(given = \"Nick\", family = \"Williams\", role = \"ctb\", email = \"ntwilliams.personal@gmail.com\"), person(given = \"Marius\", family = \"Barth\", role = \"ctb\", email = \"marius.barth.uni.koeln@gmail.com\", comment = c(ORCID = \"0000-0002-3421-6665\")), person(given = \"Bruna\", family = \"Wundervald\", role = \"ctb\", email = \"brunadaviesw@gmail.com\", comment = c(ORCID = \"0000-0001-8163-220X\")), person(given = \"Joyce\", family = \"Cahoon\", role = \"ctb\", email = \"joyceyu48@gmail.com\", comment = c(ORCID = \"0000-0001-7217-4702\")), person(given = \"Grant\", family = \"McDermott\", role = \"ctb\", email = \"grantmcd@uoregon.edu\", comment = c(ORCID = \"0000-0001-7883-8573\")), person(given = \"Kevin\", family = \"Zarca\", role = \"ctb\", email = \"kevin.zarca@gmail.com\"), person(given = \"Shiro\", family = \"Kuriwaki\", role = \"ctb\", email = \"shirokuriwaki@gmail.com\", comment = c(ORCID = \"0000-0002-5687-2647\")), person(given = \"Lukas\", family = \"Wallrich\", role = \"ctb\", email = \"lukas.wallrich@gmail.com\", comment = c(ORCID = \"0000-0003-2121-5177\")), person(given = \"James\", family = \"Martherus\", role = \"ctb\", email = \"james@martherus.com\", comment = c(ORCID = \"0000-0002-8285-3300\")), person(given = \"Chuliang\", family = \"Xiao\", role = \"ctb\", email = \"cxiao@umich.edu\", comment = c(ORCID = \"0000-0002-8466-9398\")), person(given = \"Joseph\", family = \"Larmarange\", role = \"ctb\", email = \"joseph@larmarange.net\"), person(given = \"Max\", family = \"Kuhn\", role = \"ctb\", email = \"max@posit.co\"), person(given = \"Michal\", family = \"Bojanowski\", role = \"ctb\", email = \"michal2992@gmail.com\"), person(given = \"Hakon\", family = \"Malmedal\", role = \"ctb\", email = \"hmalmedal@gmail.com\"), person(given = \"Clara\", family = \"Wang\", role = \"ctb\"), person(given = \"Sergio\", family = \"Oller\", role = \"ctb\", email = \"sergioller@gmail.com\"), person(given = \"Luke\", family = \"Sonnet\", role = \"ctb\", email = \"luke.sonnet@gmail.com\"), person(given = \"Jim\", family = \"Hester\", role = \"ctb\", email = \"jim.hester@posit.co\"), person(given = \"Ben\", family = \"Schneider\", role = \"ctb\", email = \"benjamin.julius.schneider@gmail.com\"), person(given = \"Bernie\", family = \"Gray\", role = \"ctb\", email = \"bfgray3@gmail.com\", comment = c(ORCID = \"0000-0001-9190-6032\")), person(given = \"Mara\", family = \"Averick\", role = \"ctb\", email = \"mara@posit.co\"), person(given = \"Aaron\", family = \"Jacobs\", role = \"ctb\", email = \"atheriel@gmail.com\"), person(given = \"Andreas\", family = \"Bender\", role = \"ctb\", email = \"bender.at.R@gmail.com\"), person(given = \"Sven\", family = \"Templer\", role = \"ctb\", email = \"sven.templer@gmail.com\"), person(given = \"Paul-Christian\", family = \"Buerkner\", role = \"ctb\", email = \"paul.buerkner@gmail.com\"), person(given = \"Matthew\", family = \"Kay\", role = \"ctb\", email = \"mjskay@umich.edu\"), person(given = \"Erwan\", family = \"Le Pennec\", role = \"ctb\", email = \"lepennec@gmail.com\"), person(given = \"Johan\", family = \"Junkka\", role = \"ctb\", email = \"johan.junkka@umu.se\"), person(given = \"Hao\", family = \"Zhu\", role = \"ctb\", email = \"haozhu233@gmail.com\"), person(given = \"Benjamin\", family = \"Soltoff\", role = \"ctb\", email = \"soltoffbc@uchicago.edu\"), person(given = \"Zoe\", family = \"Wilkinson Saldana\", role = \"ctb\", email = \"zoewsaldana@gmail.com\"), person(given = \"Tyler\", family = \"Littlefield\", role = \"ctb\", email = \"tylurp1@gmail.com\"), person(given = \"Charles T.\", family = \"Gray\", role = \"ctb\", email = \"charlestigray@gmail.com\"), person(given = \"Shabbh E.\", family = \"Banks\", role = \"ctb\"), person(given = \"Serina\", family = \"Robinson\", role = \"ctb\", email = \"robi0916@umn.edu\"), person(given = \"Roger\", family = \"Bivand\", role = \"ctb\", email = \"Roger.Bivand@nhh.no\"), person(given = \"Riinu\", family = \"Ots\", role = \"ctb\", email = \"riinuots@gmail.com\"), person(given = \"Nicholas\", family = \"Williams\", role = \"ctb\", email = \"ntwilliams.personal@gmail.com\"), person(given = \"Nina\", family = \"Jakobsen\", role = \"ctb\"), person(given = \"Michael\", family = \"Weylandt\", role = \"ctb\", email = \"michael.weylandt@gmail.com\"), person(given = \"Lisa\", family = \"Lendway\", role = \"ctb\", email = \"llendway@macalester.edu\"), person(given = \"Karl\", family = \"Hailperin\", role = \"ctb\", email = \"khailper@gmail.com\"), person(given = \"Josue\", family = \"Rodriguez\", role = \"ctb\", email = \"jerrodriguez@ucdavis.edu\"), person(given = \"Jenny\", family = \"Bryan\", role = \"ctb\", email = \"jenny@posit.co\"), person(given = \"Chris\", family = \"Jarvis\", role = \"ctb\", email = \"Christopher1.jarvis@gmail.com\"), person(given = \"Greg\", family = \"Macfarlane\", role = \"ctb\", email = \"gregmacfarlane@gmail.com\"), person(given = \"Brian\", family = \"Mannakee\", role = \"ctb\", email = \"bmannakee@gmail.com\"), person(given = \"Drew\", family = \"Tyre\", role = \"ctb\", email = \"atyre2@unl.edu\"), person(given = \"Shreyas\", family = \"Singh\", role = \"ctb\", email = \"shreyas.singh.298@gmail.com\"), person(given = \"Laurens\", family = \"Geffert\", role = \"ctb\", email = \"laurensgeffert@gmail.com\"), person(given = \"Hong\", family = \"Ooi\", role = \"ctb\", email = \"hongooi@microsoft.com\"), person(given = \"Henrik\", family = \"Bengtsson\", role = \"ctb\", email = \"henrikb@braju.com\"), person(given = \"Eduard\", family = \"Szocs\", role = \"ctb\", email = \"eduardszoecs@gmail.com\"), person(given = \"David\", family = \"Hugh-Jones\", role = \"ctb\", email = \"davidhughjones@gmail.com\"), person(given = \"Matthieu\", family = \"Stigler\", role = \"ctb\", email = \"Matthieu.Stigler@gmail.com\"), person(given = \"Hugo\", family = \"Tavares\", role = \"ctb\", email = \"hm533@cam.ac.uk\", comment = c(ORCID = \"0000-0001-9373-2726\")), person(given = \"R. Willem\", family = \"Vervoort\", role = \"ctb\", email = \"Willemvervoort@gmail.com\"), person(given = \"Brenton M.\", family = \"Wiernik\", role = \"ctb\", email = \"brenton@wiernik.org\"), person(given = \"Josh\", family = \"Yamamoto\", role = \"ctb\", email = \"joshuayamamoto5@gmail.com\"), person(given = \"Jasme\", family = \"Lee\", role = \"ctb\"), person(given = \"Taren\", family = \"Sanders\", role = \"ctb\", email = \"taren.sanders@acu.edu.au\", comment = c(ORCID = \"0000-0002-4504-6008\")), person(given = \"Ilaria\", family = \"Prosdocimi\", role = \"ctb\", email = \"prosdocimi.ilaria@gmail.com\", comment = c(ORCID = \"0000-0001-8565-094X\")), person(given = \"Daniel D.\", family = \"Sjoberg\", role = \"ctb\", email = \"danield.sjoberg@gmail.com\", comment = c(ORCID = \"0000-0003-0862-2018\")), person(given = \"Alex\", family = \"Reinhart\", role = \"ctb\", email = \"areinhar@stat.cmu.edu\", comment = c(ORCID = \"0000-0002-6658-514X\")))", + "Description": "Summarizes key information about statistical objects in tidy tibbles. This makes it easy to report results, create plots and consistently work with large numbers of models at once. Broom provides three verbs that each provide different types of information about a model. tidy() summarizes information about model components such as coefficients of a regression. glance() reports information about an entire model, such as goodness of fit measures like AIC and BIC. augment() adds information about individual observations to a dataset, such as fitted values or influence measures.", + "License": "MIT + file LICENSE", + "URL": "https://broom.tidymodels.org/, https://github.com/tidymodels/broom", + "BugReports": "https://github.com/tidymodels/broom/issues", + "Depends": [ + "R (>= 3.5)" + ], + "Imports": [ + "backports", + "cli", + "dplyr (>= 1.0.0)", + "generics (>= 0.0.2)", + "glue", + "lifecycle", + "purrr", + "rlang (>= 1.1.0)", + "stringr", + "tibble (>= 3.0.0)", + "tidyr (>= 1.0.0)" + ], + "Suggests": [ + "AER", + "AUC", + "bbmle", + "betareg (>= 3.2-1)", + "biglm", + "binGroup", + "boot", + "btergm (>= 1.10.6)", + "car (>= 3.1-2)", + "carData", + "caret", + "cluster", + "cmprsk", + "coda", + "covr", + "drc", + "e1071", + "emmeans", + "epiR", + "ergm (>= 3.10.4)", + "fixest (>= 0.9.0)", + "gam (>= 1.15)", + "gee", + "geepack", + "ggplot2", + "glmnet", + "glmnetUtils", + "gmm", + "Hmisc", + "irlba", + "interp", + "joineRML", + "Kendall", + "knitr", + "ks", + "Lahman", + "lavaan (>= 0.6.18)", + "leaps", + "lfe", + "lm.beta", + "lme4", + "lmodel2", + "lmtest (>= 0.9.38)", + "lsmeans", + "maps", + "margins", + "MASS", + "mclust", + "mediation", + "metafor", + "mfx", + "mgcv", + "mlogit", + "modeldata", + "modeltests (>= 0.1.6)", + "muhaz", + "multcomp", + "network", + "nnet", + "ordinal", + "plm", + "poLCA", + "psych", + "quantreg", + "rmarkdown", + "robust", + "robustbase", + "rsample", + "sandwich", + "spdep (>= 1.1)", + "spatialreg", + "speedglm", + "spelling", + "survey", + "survival (>= 3.6-4)", + "systemfit", + "testthat (>= 3.0.0)", + "tseries", + "vars", + "zoo" + ], + "VignetteBuilder": "knitr", + "Config/Needs/website": "tidyverse/tidytemplate", + "Encoding": "UTF-8", + "RoxygenNote": "7.3.2", + "Language": "en-US", + "Collate": "'aaa-documentation-helper.R' 'null-and-default.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'", + "Config/testthat/edition": "3", + "NeedsCompilation": "no", + "Author": "David Robinson [aut], Alex Hayes [aut] (), Simon Couch [aut, cre] (), Posit Software, PBC [cph, fnd], Indrajeet Patil [ctb] (), Derek Chiu [ctb], Matthieu Gomez [ctb], Boris Demeshev [ctb], Dieter Menne [ctb], Benjamin Nutter [ctb], Luke Johnston [ctb], Ben Bolker [ctb], Francois Briatte [ctb], Jeffrey Arnold [ctb], Jonah Gabry [ctb], Luciano Selzer [ctb], Gavin Simpson [ctb], Jens Preussner [ctb], Jay Hesselberth [ctb], Hadley Wickham [ctb], Matthew Lincoln [ctb], Alessandro Gasparini [ctb], Lukasz Komsta [ctb], Frederick Novometsky [ctb], Wilson Freitas [ctb], Michelle Evans [ctb], Jason Cory Brunson [ctb], Simon Jackson [ctb], Ben Whalley [ctb], Karissa Whiting [ctb], Yves Rosseel [ctb], Michael Kuehn [ctb], Jorge Cimentada [ctb], Erle Holgersen [ctb], Karl Dunkle Werner [ctb] (), Ethan Christensen [ctb], Steven Pav [ctb], Paul PJ [ctb], Ben Schneider [ctb], Patrick Kennedy [ctb], Lily Medina [ctb], Brian Fannin [ctb], Jason Muhlenkamp [ctb], Matt Lehman [ctb], Bill Denney [ctb] (), Nic Crane [ctb], Andrew Bates [ctb], Vincent Arel-Bundock [ctb] (), Hideaki Hayashi [ctb], Luis Tobalina [ctb], Annie Wang [ctb], Wei Yang Tham [ctb], Clara Wang [ctb], Abby Smith [ctb] (), Jasper Cooper [ctb] (), E Auden Krauska [ctb] (), Alex Wang [ctb], Malcolm Barrett [ctb] (), Charles Gray [ctb] (), Jared Wilber [ctb], Vilmantas Gegzna [ctb] (), Eduard Szoecs [ctb], Frederik Aust [ctb] (), Angus Moore [ctb], Nick Williams [ctb], Marius Barth [ctb] (), Bruna Wundervald [ctb] (), Joyce Cahoon [ctb] (), Grant McDermott [ctb] (), Kevin Zarca [ctb], Shiro Kuriwaki [ctb] (), Lukas Wallrich [ctb] (), James Martherus [ctb] (), Chuliang Xiao [ctb] (), Joseph Larmarange [ctb], Max Kuhn [ctb], Michal Bojanowski [ctb], Hakon Malmedal [ctb], Clara Wang [ctb], Sergio Oller [ctb], Luke Sonnet [ctb], Jim Hester [ctb], Ben Schneider [ctb], Bernie Gray [ctb] (), Mara Averick [ctb], Aaron Jacobs [ctb], Andreas Bender [ctb], Sven Templer [ctb], Paul-Christian Buerkner [ctb], Matthew Kay [ctb], Erwan Le Pennec [ctb], Johan Junkka [ctb], Hao Zhu [ctb], Benjamin Soltoff [ctb], Zoe Wilkinson Saldana [ctb], Tyler Littlefield [ctb], Charles T. Gray [ctb], Shabbh E. Banks [ctb], Serina Robinson [ctb], Roger Bivand [ctb], Riinu Ots [ctb], Nicholas Williams [ctb], Nina Jakobsen [ctb], Michael Weylandt [ctb], Lisa Lendway [ctb], Karl Hailperin [ctb], Josue Rodriguez [ctb], Jenny Bryan [ctb], Chris Jarvis [ctb], Greg Macfarlane [ctb], Brian Mannakee [ctb], Drew Tyre [ctb], Shreyas Singh [ctb], Laurens Geffert [ctb], Hong Ooi [ctb], Henrik Bengtsson [ctb], Eduard Szocs [ctb], David Hugh-Jones [ctb], Matthieu Stigler [ctb], Hugo Tavares [ctb] (), R. Willem Vervoort [ctb], Brenton M. Wiernik [ctb], Josh Yamamoto [ctb], Jasme Lee [ctb], Taren Sanders [ctb] (), Ilaria Prosdocimi [ctb] (), Daniel D. Sjoberg [ctb] (), Alex Reinhart [ctb] ()", + "Maintainer": "Simon Couch ", + "Repository": "RSPM" + }, + "broom.helpers": { + "Package": "broom.helpers", + "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\")) )", + "Description": "Provides suite of functions to work with regression model 'broom::tidy()' tibbles. The suite includes functions to group regression model terms by variable, insert reference and header rows for categorical variables, add variable labels, and more.", + "License": "GPL (>= 3)", + "URL": "https://larmarange.github.io/broom.helpers/, https://github.com/larmarange/broom.helpers", + "BugReports": "https://github.com/larmarange/broom.helpers/issues", + "Depends": [ + "R (>= 4.1)" + ], + "Imports": [ + "broom (>= 0.8)", + "cards", + "cli", + "dplyr (>= 1.1.0)", + "labelled", + "lifecycle", + "purrr", + "rlang (>= 1.0.1)", + "stats", + "stringr", + "tibble", + "tidyr", + "tidyselect" + ], + "Suggests": [ + "betareg", + "biglm", + "brms (>= 2.13.0)", + "broom.mixed", + "cmprsk", + "covr", + "datasets", + "effects", + "emmeans", + "fixest (>= 0.10.0)", + "forcats", + "gam", + "gee", + "geepack", + "ggplot2", + "ggeffects (>= 1.3.2)", + "ggstats (>= 0.2.1)", + "glmmTMB", + "glmtoolbox", + "glue", + "gt", + "gtsummary (>= 2.0.0)", + "knitr", + "lavaan", + "lfe", + "lme4 (>= 1.1.28)", + "logitr (>= 0.8.0)", + "marginaleffects (>= 0.21.0)", + "margins", + "MASS", + "mgcv", + "mice", + "mmrm (>= 0.3.6)", + "multgee", + "nnet", + "ordinal", + "parameters", + "parsnip", + "patchwork", + "plm", + "pscl", + "quantreg", + "rmarkdown", + "rstanarm", + "scales", + "spelling", + "survey", + "survival", + "testthat (>= 3.0.0)", + "tidycmprsk", + "VGAM", + "svyVGAM" + ], + "VignetteBuilder": "knitr", + "RdMacros": "lifecycle", + "Encoding": "UTF-8", + "Language": "en-US", + "LazyData": "true", + "RoxygenNote": "7.3.3", + "Config/testthat/edition": "3", + "NeedsCompilation": "no", + "Author": "Joseph Larmarange [aut, cre] (ORCID: ), Daniel D. Sjoberg [aut] (ORCID: )", + "Maintainer": "Joseph Larmarange ", + "Repository": "RSPM" }, "bslib": { "Package": "bslib", - "Version": "0.4.2", - "Source": "Repository", - "Repository": "CRAN", - "Hash": "a7fbf03946ad741129dc81098722fca1", - "Requirements": [ + "Version": "0.9.0", + "Source": "Repository", + "Title": "Custom 'Bootstrap' 'Sass' Themes for 'shiny' and 'rmarkdown'", + "Authors@R": "c( person(\"Carson\", \"Sievert\", , \"carson@posit.co\", role = c(\"aut\", \"cre\"), comment = c(ORCID = \"0000-0002-4958-2844\")), person(\"Joe\", \"Cheng\", , \"joe@posit.co\", role = \"aut\"), person(\"Garrick\", \"Aden-Buie\", , \"garrick@posit.co\", role = \"aut\", comment = c(ORCID = \"0000-0002-7111-0077\")), person(\"Posit Software, PBC\", role = c(\"cph\", \"fnd\")), person(, \"Bootstrap contributors\", role = \"ctb\", comment = \"Bootstrap library\"), person(, \"Twitter, Inc\", role = \"cph\", comment = \"Bootstrap library\"), person(\"Javi\", \"Aguilar\", role = c(\"ctb\", \"cph\"), comment = \"Bootstrap colorpicker library\"), person(\"Thomas\", \"Park\", role = c(\"ctb\", \"cph\"), comment = \"Bootswatch library\"), person(, \"PayPal\", role = c(\"ctb\", \"cph\"), comment = \"Bootstrap accessibility plugin\") )", + "Description": "Simplifies custom 'CSS' styling of both 'shiny' and 'rmarkdown' via 'Bootstrap' 'Sass'. Supports 'Bootstrap' 3, 4 and 5 as well as their various 'Bootswatch' themes. An interactive widget is also provided for previewing themes in real time.", + "License": "MIT + file LICENSE", + "URL": "https://rstudio.github.io/bslib/, https://github.com/rstudio/bslib", + "BugReports": "https://github.com/rstudio/bslib/issues", + "Depends": [ + "R (>= 2.10)" + ], + "Imports": [ "base64enc", "cachem", - "htmltools", - "jquerylib", + "fastmap (>= 1.1.1)", + "grDevices", + "htmltools (>= 0.5.8)", + "jquerylib (>= 0.1.3)", "jsonlite", - "memoise", + "lifecycle", + "memoise (>= 2.0.1)", "mime", "rlang", - "sass" - ] + "sass (>= 0.4.9)" + ], + "Suggests": [ + "bsicons", + "curl", + "fontawesome", + "future", + "ggplot2", + "knitr", + "magrittr", + "rappdirs", + "rmarkdown (>= 2.7)", + "shiny (> 1.8.1)", + "testthat", + "thematic", + "tools", + "utils", + "withr", + "yaml" + ], + "Config/Needs/deploy": "BH, chiflights22, colourpicker, commonmark, cpp11, cpsievert/chiflights22, cpsievert/histoslider, dplyr, DT, ggplot2, ggridges, gt, hexbin, histoslider, htmlwidgets, lattice, leaflet, lubridate, markdown, modelr, plotly, reactable, reshape2, rprojroot, rsconnect, rstudio/shiny, scales, styler, tibble", + "Config/Needs/routine": "chromote, desc, renv", + "Config/Needs/website": "brio, crosstalk, dplyr, DT, ggplot2, glue, htmlwidgets, leaflet, lorem, palmerpenguins, plotly, purrr, rprojroot, rstudio/htmltools, scales, stringr, tidyr, webshot2", + "Config/testthat/edition": "3", + "Config/testthat/parallel": "true", + "Config/testthat/start-first": "zzzz-bs-sass, fonts, zzz-precompile, theme-*, rmd-*", + "Encoding": "UTF-8", + "RoxygenNote": "7.3.2", + "Collate": "'accordion.R' 'breakpoints.R' 'bs-current-theme.R' 'bs-dependencies.R' 'bs-global.R' 'bs-remove.R' 'bs-theme-layers.R' 'bs-theme-preset-bootswatch.R' 'bs-theme-preset-brand.R' 'bs-theme-preset-builtin.R' 'bs-theme-preset.R' 'utils.R' 'bs-theme-preview.R' 'bs-theme-update.R' 'bs-theme.R' 'bslib-package.R' 'buttons.R' 'card.R' 'deprecated.R' 'files.R' 'fill.R' 'imports.R' 'input-dark-mode.R' 'input-switch.R' 'layout.R' 'nav-items.R' 'nav-update.R' 'navbar_options.R' 'navs-legacy.R' 'navs.R' 'onLoad.R' 'page.R' 'popover.R' 'precompiled.R' 'print.R' 'shiny-devmode.R' 'sidebar.R' 'staticimports.R' 'tooltip.R' 'utils-deps.R' 'utils-shiny.R' 'utils-tags.R' 'value-box.R' 'version-default.R' 'versions.R'", + "NeedsCompilation": "no", + "Author": "Carson Sievert [aut, cre] (), Joe Cheng [aut], Garrick Aden-Buie [aut] (), Posit Software, PBC [cph, fnd], Bootstrap contributors [ctb] (Bootstrap library), Twitter, Inc [cph] (Bootstrap library), Javi Aguilar [ctb, cph] (Bootstrap colorpicker library), Thomas Park [ctb, cph] (Bootswatch library), PayPal [ctb, cph] (Bootstrap accessibility plugin)", + "Maintainer": "Carson Sievert ", + "Repository": "CRAN" }, "cachem": { "Package": "cachem", - "Version": "1.0.7", + "Version": "1.1.0", "Source": "Repository", - "Repository": "RSPM", - "Hash": "cda74447c42f529de601fe4d4050daef", - "Requirements": [ - "fastmap", - "rlang" - ] + "Title": "Cache R Objects with Automatic Pruning", + "Description": "Key-value stores with automatic pruning. Caches can limit either their total size or the age of the oldest object (or both), automatically pruning objects to maintain the constraints.", + "Authors@R": "c( person(\"Winston\", \"Chang\", , \"winston@posit.co\", c(\"aut\", \"cre\")), person(family = \"Posit Software, PBC\", role = c(\"cph\", \"fnd\")))", + "License": "MIT + file LICENSE", + "Encoding": "UTF-8", + "ByteCompile": "true", + "URL": "https://cachem.r-lib.org/, https://github.com/r-lib/cachem", + "Imports": [ + "rlang", + "fastmap (>= 1.2.0)" + ], + "Suggests": [ + "testthat" + ], + "RoxygenNote": "7.2.3", + "Config/Needs/routine": "lobstr", + "Config/Needs/website": "pkgdown", + "NeedsCompilation": "yes", + "Author": "Winston Chang [aut, cre], Posit Software, PBC [cph, fnd]", + "Maintainer": "Winston Chang ", + "Repository": "CRAN" }, "callr": { "Package": "callr", - "Version": "3.7.3", + "Version": "3.7.6", + "Source": "Repository", + "Title": "Call R from R", + "Authors@R": "c( person(\"Gábor\", \"Csárdi\", , \"csardi.gabor@gmail.com\", role = c(\"aut\", \"cre\", \"cph\"), comment = c(ORCID = \"0000-0001-7098-9676\")), person(\"Winston\", \"Chang\", role = \"aut\"), person(\"Posit Software, PBC\", role = c(\"cph\", \"fnd\")), person(\"Ascent Digital Services\", role = c(\"cph\", \"fnd\")) )", + "Description": "It is sometimes useful to perform a computation in a separate R process, without affecting the current R process at all. This packages does exactly that.", + "License": "MIT + file LICENSE", + "URL": "https://callr.r-lib.org, https://github.com/r-lib/callr", + "BugReports": "https://github.com/r-lib/callr/issues", + "Depends": [ + "R (>= 3.4)" + ], + "Imports": [ + "processx (>= 3.6.1)", + "R6", + "utils" + ], + "Suggests": [ + "asciicast (>= 2.3.1)", + "cli (>= 1.1.0)", + "mockery", + "ps", + "rprojroot", + "spelling", + "testthat (>= 3.2.0)", + "withr (>= 2.3.0)" + ], + "Config/Needs/website": "r-lib/asciicast, glue, htmlwidgets, igraph, tibble, tidyverse/tidytemplate", + "Config/testthat/edition": "3", + "Encoding": "UTF-8", + "Language": "en-US", + "RoxygenNote": "7.3.1.9000", + "NeedsCompilation": "no", + "Author": "Gábor Csárdi [aut, cre, cph] (), Winston Chang [aut], Posit Software, PBC [cph, fnd], Ascent Digital Services [cph, fnd]", + "Maintainer": "Gábor Csárdi ", + "Repository": "CRAN" + }, + "cards": { + "Package": "cards", + "Version": "0.7.0", + "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\", 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/", + "BugReports": "https://github.com/insightsengineering/cards/issues", + "Depends": [ + "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)" + ], + "Suggests": [ + "testthat (>= 3.2.0)", + "withr (>= 3.0.0)" + ], + "Config/Needs/coverage": "hms", + "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", + "NeedsCompilation": "no", + "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": "RSPM" + }, + "cardx": { + "Package": "cardx", + "Version": "0.3.0", + "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(\"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/", + "BugReports": "https://github.com/insightsengineering/cardx/issues", + "Depends": [ + "R (>= 4.2)" + ], + "Imports": [ + "cards (>= 0.7.0)", + "cli (>= 3.6.1)", + "dplyr (>= 1.1.2)", + "glue (>= 1.6.2)", + "lifecycle (>= 1.0.3)", + "rlang (>= 1.1.1)", + "tidyr (>= 1.3.0)" + ], + "Suggests": [ + "aod (>= 1.3.3)", + "broom (>= 1.0.8)", + "broom.helpers (>= 1.17.0)", + "broom.mixed (>= 0.2.9)", + "car (>= 3.1-2)", + "effectsize (>= 0.8.8)", + "emmeans (>= 1.7.3)", + "geepack (>= 1.3.2)", + "ggsurvfit (>= 1.1.0)", + "lme4 (>= 1.1-37)", + "parameters (>= 0.20.2)", + "smd (>= 0.6.6)", + "survey (>= 4.2)", + "survival (>= 3.6-4)", + "testthat (>= 3.2.0)", + "withr (>= 2.5.0)" + ], + "Config/Needs/website": "insightsengineering/nesttemplate", + "Config/testthat/edition": "3", + "Config/testthat/parallel": "true", + "Encoding": "UTF-8", + "Language": "en-US", + "RoxygenNote": "7.3.2", + "NeedsCompilation": "no", + "Author": "Daniel 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": "RSPM" + }, + "cellranger": { + "Package": "cellranger", + "Version": "1.1.0", "Source": "Repository", + "Title": "Translate Spreadsheet Cell Ranges to Rows and Columns", + "Authors@R": "c( person(\"Jennifer\", \"Bryan\", , \"jenny@stat.ubc.ca\", c(\"cre\", \"aut\")), person(\"Hadley\", \"Wickham\", , \"hadley@rstudio.com\", \"ctb\") )", + "Description": "Helper functions to work with spreadsheets and the \"A1:D10\" style of cell range specification.", + "Depends": [ + "R (>= 3.0.0)" + ], + "License": "MIT + file LICENSE", + "LazyData": "true", + "URL": "https://github.com/rsheets/cellranger", + "BugReports": "https://github.com/rsheets/cellranger/issues", + "Suggests": [ + "covr", + "testthat (>= 1.0.0)", + "knitr", + "rmarkdown" + ], + "RoxygenNote": "5.0.1.9000", + "VignetteBuilder": "knitr", + "Imports": [ + "rematch", + "tibble" + ], + "NeedsCompilation": "no", + "Author": "Jennifer Bryan [cre, aut], Hadley Wickham [ctb]", + "Maintainer": "Jennifer Bryan ", "Repository": "CRAN", - "Hash": "9b2191ede20fa29828139b9900922e51", - "Requirements": [ - "R6", - "processx" - ] - }, - "checkhelper": { - "Package": "checkhelper", - "Version": "0.0.1.9000", - "Source": "GitHub", - "RemoteType": "github", - "RemoteHost": "api.github.com", - "RemoteRepo": "checkhelper", - "RemoteUsername": "ThinkR-open", - "RemoteRef": "HEAD", - "RemoteSha": "d2e4fcada1b094d7af06324f6c54301c7586ffee", - "Hash": "47cf609e35bca6b2071cd8ed8e40c6d2", - "Requirements": [ - "cli", - "desc", - "devtools", - "dplyr", - "glue", - "lifecycle", - "magrittr", - "pkgbuild", - "purrr", - "rcmdcheck", - "roxygen2", - "stringr", - "whisker", - "withr" - ] + "Encoding": "UTF-8" }, "cicerone": { "Package": "cicerone", "Version": "1.0.4", "Source": "Repository", - "Repository": "CRAN", - "Hash": "b8f2ca302978e3e16a68d3ec8ab0c44d", - "Requirements": [ + "Title": "Provide Tours of 'Shiny' Applications", + "Date": "2021-01-10", + "Authors@R": "c( person(given = \"John\", family = \"Coene\", role = c(\"aut\", \"cre\"), email = \"jcoenep@gmail.com\", comment = c(ORCID = \"0000-0002-6637-4107\")), person(given = \"Etienne\", family = \"Bacher\", role = \"ctb\", email = \"etienne.bacher@protonmail.com\") )", + "Description": "Provide step by step guided tours of 'Shiny' applications.", + "License": "MIT + file LICENSE", + "Encoding": "UTF-8", + "LazyData": "true", + "Imports": [ "R6", - "assertthat", - "shiny" - ] + "shiny", + "assertthat" + ], + "RoxygenNote": "7.1.1.9000", + "URL": "https://cicerone.john-coene.com/", + "BugReports": "https://github.com/JohnCoene/cicerone/issues", + "NeedsCompilation": "no", + "Author": "John Coene [aut, cre] (), Etienne Bacher [ctb]", + "Maintainer": "John Coene ", + "Repository": "CRAN" }, "cli": { "Package": "cli", - "Version": "3.6.0", - "Source": "Repository", - "Repository": "RSPM", - "Hash": "3177a5a16c243adc199ba33117bd9657", - "Requirements": [] + "Version": "3.6.4", + "Source": "Repository", + "Title": "Helpers for Developing Command Line Interfaces", + "Authors@R": "c( person(\"Gábor\", \"Csárdi\", , \"gabor@posit.co\", role = c(\"aut\", \"cre\")), person(\"Hadley\", \"Wickham\", role = \"ctb\"), person(\"Kirill\", \"Müller\", role = \"ctb\"), person(\"Salim\", \"Brüggemann\", , \"salim-b@pm.me\", role = \"ctb\", comment = c(ORCID = \"0000-0002-5329-5987\")), person(\"Posit Software, PBC\", role = c(\"cph\", \"fnd\")) )", + "Description": "A suite of tools to build attractive command line interfaces ('CLIs'), from semantic elements: headings, lists, alerts, paragraphs, etc. Supports custom themes via a 'CSS'-like language. It also contains a number of lower level 'CLI' elements: rules, boxes, trees, and 'Unicode' symbols with 'ASCII' alternatives. It support ANSI colors and text styles as well.", + "License": "MIT + file LICENSE", + "URL": "https://cli.r-lib.org, https://github.com/r-lib/cli", + "BugReports": "https://github.com/r-lib/cli/issues", + "Depends": [ + "R (>= 3.4)" + ], + "Imports": [ + "utils" + ], + "Suggests": [ + "callr", + "covr", + "crayon", + "digest", + "glue (>= 1.6.0)", + "grDevices", + "htmltools", + "htmlwidgets", + "knitr", + "methods", + "processx", + "ps (>= 1.3.4.9000)", + "rlang (>= 1.0.2.9003)", + "rmarkdown", + "rprojroot", + "rstudioapi", + "testthat (>= 3.2.0)", + "tibble", + "whoami", + "withr" + ], + "Config/Needs/website": "r-lib/asciicast, bench, brio, cpp11, decor, desc, fansi, prettyunits, sessioninfo, tidyverse/tidytemplate, usethis, vctrs", + "Config/testthat/edition": "3", + "Encoding": "UTF-8", + "RoxygenNote": "7.3.2", + "NeedsCompilation": "yes", + "Author": "Gábor Csárdi [aut, cre], Hadley Wickham [ctb], Kirill Müller [ctb], Salim Brüggemann [ctb] (), Posit Software, PBC [cph, fnd]", + "Maintainer": "Gábor Csárdi ", + "Repository": "CRAN" }, "clipr": { "Package": "clipr", "Version": "0.8.0", "Source": "Repository", - "Repository": "CRAN", - "Hash": "3f038e5ac7f41d4ac41ce658c85e3042", - "Requirements": [] - }, - "colorspace": { - "Package": "colorspace", - "Version": "2.1-0", - "Source": "Repository", - "Repository": "RSPM", - "Hash": "f20c47fd52fae58b4e377c37bb8c335b", - "Requirements": [] + "Type": "Package", + "Title": "Read and Write from the System Clipboard", + "Authors@R": "c( person(\"Matthew\", \"Lincoln\", , \"matthew.d.lincoln@gmail.com\", role = c(\"aut\", \"cre\"), comment = c(ORCID = \"0000-0002-4387-3384\")), person(\"Louis\", \"Maddox\", role = \"ctb\"), person(\"Steve\", \"Simpson\", role = \"ctb\"), person(\"Jennifer\", \"Bryan\", role = \"ctb\") )", + "Description": "Simple utility functions to read from and write to the Windows, OS X, and X11 clipboards.", + "License": "GPL-3", + "URL": "https://github.com/mdlincoln/clipr, http://matthewlincoln.net/clipr/", + "BugReports": "https://github.com/mdlincoln/clipr/issues", + "Imports": [ + "utils" + ], + "Suggests": [ + "covr", + "knitr", + "rmarkdown", + "rstudioapi (>= 0.5)", + "testthat (>= 2.0.0)" + ], + "VignetteBuilder": "knitr", + "Encoding": "UTF-8", + "Language": "en-US", + "RoxygenNote": "7.1.2", + "SystemRequirements": "xclip (https://github.com/astrand/xclip) or xsel (http://www.vergenet.net/~conrad/software/xsel/) for accessing the X11 clipboard, or wl-clipboard (https://github.com/bugaevc/wl-clipboard) for systems using Wayland.", + "NeedsCompilation": "no", + "Author": "Matthew Lincoln [aut, cre] (), Louis Maddox [ctb], Steve Simpson [ctb], Jennifer Bryan [ctb]", + "Maintainer": "Matthew Lincoln ", + "Repository": "RSPM" }, "commonmark": { "Package": "commonmark", - "Version": "1.8.1", - "Source": "Repository", - "Repository": "RSPM", - "Hash": "b6e3e947d1d7ebf3d2bdcea1bde63fe7", - "Requirements": [] + "Version": "1.9.5", + "Source": "Repository", + "Type": "Package", + "Title": "High Performance CommonMark and Github Markdown Rendering in R", + "Authors@R": "c( person(\"Jeroen\", \"Ooms\", ,\"jeroenooms@gmail.com\", role = c(\"aut\", \"cre\"), comment = c(ORCID = \"0000-0002-4035-0289\")), person(\"John MacFarlane\", role = \"cph\", comment = \"Author of cmark\"))", + "Description": "The CommonMark specification defines a rationalized version of markdown syntax. This package uses the 'cmark' reference implementation for converting markdown text into various formats including html, latex and groff man. In addition it exposes the markdown parse tree in xml format. Also includes opt-in support for GFM extensions including tables, autolinks, and strikethrough text.", + "License": "BSD_2_clause + file LICENSE", + "URL": "https://docs.ropensci.org/commonmark/ https://ropensci.r-universe.dev/commonmark", + "BugReports": "https://github.com/r-lib/commonmark/issues", + "Suggests": [ + "curl", + "testthat", + "xml2" + ], + "RoxygenNote": "7.3.2", + "Language": "en-US", + "Encoding": "UTF-8", + "NeedsCompilation": "yes", + "Author": "Jeroen Ooms [aut, cre] (), John MacFarlane [cph] (Author of cmark)", + "Maintainer": "Jeroen Ooms ", + "Repository": "RSPM" }, "config": { "Package": "config", - "Version": "0.3.1", + "Version": "0.3.2", "Source": "Repository", - "Repository": "CRAN", - "Hash": "31d77b09f63550cee9ecb5a08bf76e8f", - "Requirements": [ - "yaml" - ] + "Type": "Package", + "Title": "Manage Environment Specific Configuration Values", + "Authors@R": "c( person(\"JJ\", \"Allaire\", role = c(\"aut\"), email = \"jj@rstudio.com\"), person(\"Andrie\", \"de Vries\", role = \"cre\", email = \"apdevries@gmail.com\"), person(\"Posit Software, PBC\", role = c(\"cph\", \"fnd\")) )", + "Imports": [ + "yaml (>= 2.1.19)" + ], + "Suggests": [ + "testthat", + "knitr", + "rmarkdown", + "covr", + "spelling", + "withr" + ], + "Description": "Manage configuration values across multiple environments (e.g. development, test, production). Read values using a function that determines the current environment and returns the appropriate value.", + "License": "GPL-3", + "URL": "https://rstudio.github.io/config/, https://github.com/rstudio/config", + "BugReports": "https://github.com/rstudio/config/issues", + "RoxygenNote": "7.2.3", + "VignetteBuilder": "knitr", + "Encoding": "UTF-8", + "Language": "en-US", + "Config/testthat/edition": "3", + "NeedsCompilation": "no", + "Author": "JJ Allaire [aut], Andrie de Vries [cre], Posit Software, PBC [cph, fnd]", + "Maintainer": "Andrie de Vries ", + "Repository": "RSPM" }, - "covr": { - "Package": "covr", - "Version": "3.6.1", + "cpp11": { + "Package": "cpp11", + "Version": "0.5.2", "Source": "Repository", - "Repository": "CRAN", - "Hash": "a861cee34fbb4b107a73dd414ef56724", - "Requirements": [ - "crayon", - "digest", - "httr", - "jsonlite", - "rex", - "withr", - "yaml" - ] - }, - "cpp11": { - "Package": "cpp11", - "Version": "0.4.3", - "Source": "Repository", - "Repository": "RSPM", - "Hash": "ed588261931ee3be2c700d22e94a29ab", - "Requirements": [] - }, - "cranlogs": { - "Package": "cranlogs", - "Version": "2.1.1", - "Source": "Repository", - "Repository": "CRAN", - "Hash": "cfa4eec97df94fd69cb8652368966020", - "Requirements": [ - "httr", - "jsonlite" - ] + "Title": "A C++11 Interface for R's C Interface", + "Authors@R": "c( person(\"Davis\", \"Vaughan\", email = \"davis@posit.co\", role = c(\"aut\", \"cre\"), comment = c(ORCID = \"0000-0003-4777-038X\")), person(\"Jim\",\"Hester\", role = \"aut\", comment = c(ORCID = \"0000-0002-2739-7082\")), person(\"Romain\", \"François\", role = \"aut\", comment = c(ORCID = \"0000-0002-2444-4226\")), person(\"Benjamin\", \"Kietzman\", role = \"ctb\"), person(\"Posit Software, PBC\", role = c(\"cph\", \"fnd\")) )", + "Description": "Provides a header only, C++11 interface to R's C interface. Compared to other approaches 'cpp11' strives to be safe against long jumps from the C API as well as C++ exceptions, conform to normal R function semantics and supports interaction with 'ALTREP' vectors.", + "License": "MIT + file LICENSE", + "URL": "https://cpp11.r-lib.org, https://github.com/r-lib/cpp11", + "BugReports": "https://github.com/r-lib/cpp11/issues", + "Depends": [ + "R (>= 4.0.0)" + ], + "Suggests": [ + "bench", + "brio", + "callr", + "cli", + "covr", + "decor", + "desc", + "ggplot2", + "glue", + "knitr", + "lobstr", + "mockery", + "progress", + "rmarkdown", + "scales", + "Rcpp", + "testthat (>= 3.2.0)", + "tibble", + "utils", + "vctrs", + "withr" + ], + "VignetteBuilder": "knitr", + "Config/Needs/website": "tidyverse/tidytemplate", + "Config/testthat/edition": "3", + "Config/Needs/cpp11/cpp_register": "brio, cli, decor, desc, glue, tibble, vctrs", + "Encoding": "UTF-8", + "RoxygenNote": "7.3.2", + "NeedsCompilation": "no", + "Author": "Davis Vaughan [aut, cre] (), Jim Hester [aut] (), Romain François [aut] (), Benjamin Kietzman [ctb], Posit Software, PBC [cph, fnd]", + "Maintainer": "Davis Vaughan ", + "Repository": "CRAN" }, "crayon": { "Package": "crayon", - "Version": "1.5.2", - "Source": "Repository", - "Repository": "CRAN", - "Hash": "e8a1e41acf02548751f45c718d55aa6a", - "Requirements": [] - }, - "credentials": { - "Package": "credentials", - "Version": "1.3.2", - "Source": "Repository", - "Repository": "CRAN", - "Hash": "93762d0a34d78e6a025efdbfb5c6bb41", - "Requirements": [ - "askpass", - "curl", - "jsonlite", - "openssl", - "sys" - ] + "Version": "1.5.3", + "Source": "Repository", + "Title": "Colored Terminal Output", + "Authors@R": "c( person(\"Gábor\", \"Csárdi\", , \"csardi.gabor@gmail.com\", role = c(\"aut\", \"cre\")), person(\"Brodie\", \"Gaslam\", , \"brodie.gaslam@yahoo.com\", role = \"ctb\"), person(\"Posit Software, PBC\", role = c(\"cph\", \"fnd\")) )", + "Description": "The crayon package is now superseded. Please use the 'cli' package for new projects. Colored terminal output on terminals that support 'ANSI' color and highlight codes. It also works in 'Emacs' 'ESS'. 'ANSI' color support is automatically detected. Colors and highlighting can be combined and nested. New styles can also be created easily. This package was inspired by the 'chalk' 'JavaScript' project.", + "License": "MIT + file LICENSE", + "URL": "https://r-lib.github.io/crayon/, https://github.com/r-lib/crayon", + "BugReports": "https://github.com/r-lib/crayon/issues", + "Imports": [ + "grDevices", + "methods", + "utils" + ], + "Suggests": [ + "mockery", + "rstudioapi", + "testthat", + "withr" + ], + "Config/Needs/website": "tidyverse/tidytemplate", + "Encoding": "UTF-8", + "RoxygenNote": "7.3.1", + "Collate": "'aaa-rstudio-detect.R' 'aaaa-rematch2.R' 'aab-num-ansi-colors.R' 'aac-num-ansi-colors.R' 'ansi-256.R' 'ansi-palette.R' 'combine.R' 'string.R' 'utils.R' 'crayon-package.R' 'disposable.R' 'enc-utils.R' 'has_ansi.R' 'has_color.R' 'link.R' 'styles.R' 'machinery.R' 'parts.R' 'print.R' 'style-var.R' 'show.R' 'string_operations.R'", + "NeedsCompilation": "no", + "Author": "Gábor Csárdi [aut, cre], Brodie Gaslam [ctb], Posit Software, PBC [cph, fnd]", + "Maintainer": "Gábor Csárdi ", + "Repository": "CRAN" }, "crosstalk": { "Package": "crosstalk", - "Version": "1.2.0", - "Source": "Repository", - "Repository": "CRAN", - "Hash": "6aa54f69598c32177e920eb3402e8293", - "Requirements": [ - "R6", - "htmltools", - "jsonlite", - "lazyeval" - ] - }, - "crul": { - "Package": "crul", - "Version": "1.3", + "Version": "1.2.1", "Source": "Repository", - "Repository": "CRAN", - "Hash": "2408d291bf25a9a6c27d912bcfe6ce0c", - "Requirements": [ - "R6", - "curl", - "httpcode", + "Type": "Package", + "Title": "Inter-Widget Interactivity for HTML Widgets", + "Authors@R": "c( person(\"Joe\", \"Cheng\", role = \"aut\", email = \"joe@posit.co\"), person(\"Carson\", \"Sievert\", role = c(\"aut\", \"cre\"), email = \"carson@posit.co\", comment = c(ORCID = \"0000-0002-4958-2844\")), person(\"Posit Software, PBC\", role = c(\"cph\", \"fnd\")), person(family = \"jQuery Foundation\", role = \"cph\", comment = \"jQuery library and jQuery UI library\"), person(family = \"jQuery contributors\", role = c(\"ctb\", \"cph\"), comment = \"jQuery library; authors listed in inst/www/shared/jquery-AUTHORS.txt\"), person(\"Mark\", \"Otto\", role = \"ctb\", comment = \"Bootstrap library\"), person(\"Jacob\", \"Thornton\", role = \"ctb\", comment = \"Bootstrap library\"), person(family = \"Bootstrap contributors\", role = \"ctb\", comment = \"Bootstrap library\"), person(family = \"Twitter, Inc\", role = \"cph\", comment = \"Bootstrap library\"), person(\"Brian\", \"Reavis\", role = c(\"ctb\", \"cph\"), comment = \"selectize.js library\"), person(\"Kristopher Michael\", \"Kowal\", role = c(\"ctb\", \"cph\"), comment = \"es5-shim library\"), person(family = \"es5-shim contributors\", role = c(\"ctb\", \"cph\"), comment = \"es5-shim library\"), person(\"Denis\", \"Ineshin\", role = c(\"ctb\", \"cph\"), comment = \"ion.rangeSlider library\"), person(\"Sami\", \"Samhuri\", role = c(\"ctb\", \"cph\"), comment = \"Javascript strftime library\") )", + "Description": "Provides building blocks for allowing HTML widgets to communicate with each other, with Shiny or without (i.e. static .html files). Currently supports linked brushing and filtering.", + "License": "MIT + file LICENSE", + "Imports": [ + "htmltools (>= 0.3.6)", "jsonlite", - "mime", - "urltools" - ] + "lazyeval", + "R6" + ], + "Suggests": [ + "shiny", + "ggplot2", + "testthat (>= 2.1.0)", + "sass", + "bslib" + ], + "URL": "https://rstudio.github.io/crosstalk/, https://github.com/rstudio/crosstalk", + "BugReports": "https://github.com/rstudio/crosstalk/issues", + "RoxygenNote": "7.2.3", + "Encoding": "UTF-8", + "NeedsCompilation": "no", + "Author": "Joe Cheng [aut], Carson Sievert [aut, cre] (), Posit Software, PBC [cph, fnd], jQuery Foundation [cph] (jQuery library and jQuery UI library), jQuery contributors [ctb, cph] (jQuery library; authors listed in inst/www/shared/jquery-AUTHORS.txt), Mark Otto [ctb] (Bootstrap library), Jacob Thornton [ctb] (Bootstrap library), Bootstrap contributors [ctb] (Bootstrap library), Twitter, Inc [cph] (Bootstrap library), Brian Reavis [ctb, cph] (selectize.js library), Kristopher Michael Kowal [ctb, cph] (es5-shim library), es5-shim contributors [ctb, cph] (es5-shim library), Denis Ineshin [ctb, cph] (ion.rangeSlider library), Sami Samhuri [ctb, cph] (Javascript strftime library)", + "Maintainer": "Carson Sievert ", + "Repository": "RSPM" }, "curl": { "Package": "curl", - "Version": "5.0.0", - "Source": "Repository", - "Repository": "RSPM", - "Hash": "e4f97056611e8e6b8b852d13b7400cf1", - "Requirements": [] + "Version": "6.2.2", + "Source": "Repository", + "Type": "Package", + "Title": "A Modern and Flexible Web Client for R", + "Authors@R": "c( person(\"Jeroen\", \"Ooms\", role = c(\"aut\", \"cre\"), email = \"jeroenooms@gmail.com\", comment = c(ORCID = \"0000-0002-4035-0289\")), person(\"Hadley\", \"Wickham\", role = \"ctb\"), person(\"Posit Software, PBC\", role = \"cph\"))", + "Description": "Bindings to 'libcurl' for performing fully configurable HTTP/FTP requests where responses can be processed in memory, on disk, or streaming via the callback or connection interfaces. Some knowledge of 'libcurl' is recommended; for a more-user-friendly web client see the 'httr2' package which builds on this package with http specific tools and logic.", + "License": "MIT + file LICENSE", + "SystemRequirements": "libcurl (>= 7.62): libcurl-devel (rpm) or libcurl4-openssl-dev (deb)", + "URL": "https://jeroen.r-universe.dev/curl", + "BugReports": "https://github.com/jeroen/curl/issues", + "Suggests": [ + "spelling", + "testthat (>= 1.0.0)", + "knitr", + "jsonlite", + "later", + "rmarkdown", + "httpuv (>= 1.4.4)", + "webutils" + ], + "VignetteBuilder": "knitr", + "Depends": [ + "R (>= 3.0.0)" + ], + "RoxygenNote": "7.3.2.9000", + "Encoding": "UTF-8", + "Language": "en-US", + "NeedsCompilation": "yes", + "Author": "Jeroen Ooms [aut, cre] (), Hadley Wickham [ctb], Posit Software, PBC [cph]", + "Maintainer": "Jeroen Ooms ", + "Repository": "RSPM" }, "data.table": { "Package": "data.table", - "Version": "1.14.8", - "Source": "Repository", - "Repository": "RSPM", - "Hash": "b4c06e554f33344e044ccd7fdca750a9", - "Requirements": [] + "Version": "1.17.4", + "Source": "Repository", + "Title": "Extension of `data.frame`", + "Depends": [ + "R (>= 3.3.0)" + ], + "Imports": [ + "methods" + ], + "Suggests": [ + "bit64 (>= 4.0.0)", + "bit (>= 4.0.4)", + "R.utils", + "xts", + "zoo (>= 1.8-1)", + "yaml", + "knitr", + "markdown" + ], + "Description": "Fast aggregation of large data (e.g. 100GB in RAM), fast ordered joins, fast add/modify/delete of columns by group using no copies at all, list columns, friendly and fast character-separated-value read/write. Offers a natural and flexible syntax, for faster development.", + "License": "MPL-2.0 | file LICENSE", + "URL": "https://r-datatable.com, https://Rdatatable.gitlab.io/data.table, https://github.com/Rdatatable/data.table", + "BugReports": "https://github.com/Rdatatable/data.table/issues", + "VignetteBuilder": "knitr", + "Encoding": "UTF-8", + "ByteCompile": "TRUE", + "Authors@R": "c( person(\"Tyson\",\"Barrett\", role=c(\"aut\",\"cre\"), email=\"t.barrett88@gmail.com\", comment = c(ORCID=\"0000-0002-2137-1391\")), person(\"Matt\",\"Dowle\", role=\"aut\", email=\"mattjdowle@gmail.com\"), person(\"Arun\",\"Srinivasan\", role=\"aut\", email=\"asrini@pm.me\"), person(\"Jan\",\"Gorecki\", role=\"aut\"), person(\"Michael\",\"Chirico\", role=\"aut\", comment = c(ORCID=\"0000-0003-0787-087X\")), person(\"Toby\",\"Hocking\", role=\"aut\", comment = c(ORCID=\"0000-0002-3146-0865\")), person(\"Benjamin\",\"Schwendinger\",role=\"aut\", comment = c(ORCID=\"0000-0003-3315-8114\")), person(\"Ivan\", \"Krylov\", role=\"aut\", email=\"ikrylov@disroot.org\", comment = c(ORCID=\"0000-0002-0172-3812\")), person(\"Pasha\",\"Stetsenko\", role=\"ctb\"), person(\"Tom\",\"Short\", role=\"ctb\"), person(\"Steve\",\"Lianoglou\", role=\"ctb\"), person(\"Eduard\",\"Antonyan\", role=\"ctb\"), person(\"Markus\",\"Bonsch\", role=\"ctb\"), person(\"Hugh\",\"Parsonage\", role=\"ctb\"), person(\"Scott\",\"Ritchie\", role=\"ctb\"), person(\"Kun\",\"Ren\", role=\"ctb\"), person(\"Xianying\",\"Tan\", role=\"ctb\"), person(\"Rick\",\"Saporta\", role=\"ctb\"), person(\"Otto\",\"Seiskari\", role=\"ctb\"), person(\"Xianghui\",\"Dong\", role=\"ctb\"), person(\"Michel\",\"Lang\", role=\"ctb\"), person(\"Watal\",\"Iwasaki\", role=\"ctb\"), person(\"Seth\",\"Wenchel\", role=\"ctb\"), person(\"Karl\",\"Broman\", role=\"ctb\"), person(\"Tobias\",\"Schmidt\", role=\"ctb\"), person(\"David\",\"Arenburg\", role=\"ctb\"), person(\"Ethan\",\"Smith\", role=\"ctb\"), person(\"Francois\",\"Cocquemas\", role=\"ctb\"), person(\"Matthieu\",\"Gomez\", role=\"ctb\"), person(\"Philippe\",\"Chataignon\", role=\"ctb\"), person(\"Nello\",\"Blaser\", role=\"ctb\"), person(\"Dmitry\",\"Selivanov\", role=\"ctb\"), person(\"Andrey\",\"Riabushenko\", role=\"ctb\"), person(\"Cheng\",\"Lee\", role=\"ctb\"), person(\"Declan\",\"Groves\", role=\"ctb\"), person(\"Daniel\",\"Possenriede\", role=\"ctb\"), person(\"Felipe\",\"Parages\", role=\"ctb\"), person(\"Denes\",\"Toth\", role=\"ctb\"), person(\"Mus\",\"Yaramaz-David\", role=\"ctb\"), person(\"Ayappan\",\"Perumal\", role=\"ctb\"), person(\"James\",\"Sams\", role=\"ctb\"), person(\"Martin\",\"Morgan\", role=\"ctb\"), person(\"Michael\",\"Quinn\", role=\"ctb\"), person(\"@javrucebo\",\"\", role=\"ctb\"), person(\"@marc-outins\",\"\", role=\"ctb\"), person(\"Roy\",\"Storey\", role=\"ctb\"), person(\"Manish\",\"Saraswat\", role=\"ctb\"), person(\"Morgan\",\"Jacob\", role=\"ctb\"), person(\"Michael\",\"Schubmehl\", role=\"ctb\"), person(\"Davis\",\"Vaughan\", role=\"ctb\"), person(\"Leonardo\",\"Silvestri\", role=\"ctb\"), person(\"Jim\",\"Hester\", role=\"ctb\"), person(\"Anthony\",\"Damico\", role=\"ctb\"), person(\"Sebastian\",\"Freundt\", role=\"ctb\"), person(\"David\",\"Simons\", role=\"ctb\"), person(\"Elliott\",\"Sales de Andrade\", role=\"ctb\"), person(\"Cole\",\"Miller\", role=\"ctb\"), person(\"Jens Peder\",\"Meldgaard\", role=\"ctb\"), person(\"Vaclav\",\"Tlapak\", role=\"ctb\"), person(\"Kevin\",\"Ushey\", role=\"ctb\"), person(\"Dirk\",\"Eddelbuettel\", role=\"ctb\"), person(\"Tony\",\"Fischetti\", role=\"ctb\"), person(\"Ofek\",\"Shilon\", role=\"ctb\"), person(\"Vadim\",\"Khotilovich\", role=\"ctb\"), person(\"Hadley\",\"Wickham\", role=\"ctb\"), person(\"Bennet\",\"Becker\", role=\"ctb\"), person(\"Kyle\",\"Haynes\", role=\"ctb\"), person(\"Boniface Christian\",\"Kamgang\", role=\"ctb\"), person(\"Olivier\",\"Delmarcell\", role=\"ctb\"), person(\"Josh\",\"O'Brien\", role=\"ctb\"), person(\"Dereck\",\"de Mezquita\", role=\"ctb\"), person(\"Michael\",\"Czekanski\", role=\"ctb\"), person(\"Dmitry\", \"Shemetov\", role=\"ctb\"), person(\"Nitish\", \"Jha\", role=\"ctb\"), person(\"Joshua\", \"Wu\", role=\"ctb\"), person(\"Iago\", \"Giné-Vázquez\", role=\"ctb\"), person(\"Anirban\", \"Chetia\", role=\"ctb\"), person(\"Doris\", \"Amoakohene\", role=\"ctb\"), person(\"Angel\", \"Feliz\", role=\"ctb\"), person(\"Michael\",\"Young\", role=\"ctb\"), person(\"Mark\", \"Seeto\", role=\"ctb\"), person(\"Philippe\", \"Grosjean\", role=\"ctb\"), person(\"Vincent\", \"Runge\", role=\"ctb\"), person(\"Christian\", \"Wia\", role=\"ctb\"), person(\"Elise\", \"Maigné\", role=\"ctb\"), person(\"Vincent\", \"Rocher\", role=\"ctb\"), person(\"Vijay\", \"Lulla\", role=\"ctb\"), person(\"Aljaž\", \"Sluga\", role=\"ctb\"), person(\"Bill\", \"Evans\", role=\"ctb\") )", + "NeedsCompilation": "yes", + "Author": "Tyson Barrett [aut, cre] (ORCID: ), Matt Dowle [aut], Arun Srinivasan [aut], Jan Gorecki [aut], Michael Chirico [aut] (ORCID: ), Toby Hocking [aut] (ORCID: ), Benjamin Schwendinger [aut] (ORCID: ), Ivan Krylov [aut] (ORCID: ), Pasha Stetsenko [ctb], Tom Short [ctb], Steve Lianoglou [ctb], Eduard Antonyan [ctb], Markus Bonsch [ctb], Hugh Parsonage [ctb], Scott Ritchie [ctb], Kun Ren [ctb], Xianying Tan [ctb], Rick Saporta [ctb], Otto Seiskari [ctb], Xianghui Dong [ctb], Michel Lang [ctb], Watal Iwasaki [ctb], Seth Wenchel [ctb], Karl Broman [ctb], Tobias Schmidt [ctb], David Arenburg [ctb], Ethan Smith [ctb], Francois Cocquemas [ctb], Matthieu Gomez [ctb], Philippe Chataignon [ctb], Nello Blaser [ctb], Dmitry Selivanov [ctb], Andrey Riabushenko [ctb], Cheng Lee [ctb], Declan Groves [ctb], Daniel Possenriede [ctb], Felipe Parages [ctb], Denes Toth [ctb], Mus Yaramaz-David [ctb], Ayappan Perumal [ctb], James Sams [ctb], Martin Morgan [ctb], Michael Quinn [ctb], @javrucebo [ctb], @marc-outins [ctb], Roy Storey [ctb], Manish Saraswat [ctb], Morgan Jacob [ctb], Michael Schubmehl [ctb], Davis Vaughan [ctb], Leonardo Silvestri [ctb], Jim Hester [ctb], Anthony Damico [ctb], Sebastian Freundt [ctb], David Simons [ctb], Elliott Sales de Andrade [ctb], Cole Miller [ctb], Jens Peder Meldgaard [ctb], Vaclav Tlapak [ctb], Kevin Ushey [ctb], Dirk Eddelbuettel [ctb], Tony Fischetti [ctb], Ofek Shilon [ctb], Vadim Khotilovich [ctb], Hadley Wickham [ctb], Bennet Becker [ctb], Kyle Haynes [ctb], Boniface Christian Kamgang [ctb], Olivier Delmarcell [ctb], Josh O'Brien [ctb], Dereck de Mezquita [ctb], Michael Czekanski [ctb], Dmitry Shemetov [ctb], Nitish Jha [ctb], Joshua Wu [ctb], Iago Giné-Vázquez [ctb], Anirban Chetia [ctb], Doris Amoakohene [ctb], Angel Feliz [ctb], Michael Young [ctb], Mark Seeto [ctb], Philippe Grosjean [ctb], Vincent Runge [ctb], Christian Wia [ctb], Elise Maigné [ctb], Vincent Rocher [ctb], Vijay Lulla [ctb], Aljaž Sluga [ctb], Bill Evans [ctb]", + "Maintainer": "Tyson Barrett ", + "Repository": "CRAN" }, "datawizard": { "Package": "datawizard", - "Version": "0.6.5", + "Version": "1.1.0", "Source": "Repository", - "Repository": "RSPM", - "Hash": "6af559e24be9cec37516e37a00a6cfc3", - "Requirements": [ - "insight" - ] + "Type": "Package", + "Title": "Easy Data Wrangling and Statistical Transformations", + "Authors@R": "c( person(\"Indrajeet\", \"Patil\", , \"patilindrajeet.science@gmail.com\", role = \"aut\", comment = c(ORCID = \"0000-0003-1995-6531\")), person(\"Etienne\", \"Bacher\", , \"etienne.bacher@protonmail.com\", role = c(\"aut\", \"cre\"), comment = c(ORCID = \"0000-0002-9271-5075\")), person(\"Dominique\", \"Makowski\", , \"dom.makowski@gmail.com\", role = \"aut\", comment = c(ORCID = \"0000-0001-5375-9967\")), person(\"Daniel\", \"Lüdecke\", , \"d.luedecke@uke.de\", role = \"aut\", comment = c(ORCID = \"0000-0002-8895-3206\")), person(\"Mattan S.\", \"Ben-Shachar\", , \"matanshm@post.bgu.ac.il\", role = \"aut\", comment = c(ORCID = \"0000-0002-4287-4801\")), person(\"Brenton M.\", \"Wiernik\", , \"brenton@wiernik.org\", role = \"aut\", comment = c(ORCID = \"0000-0001-9560-6336\")), person(\"Rémi\", \"Thériault\", , \"remi.theriault@mail.mcgill.ca\", role = \"ctb\", comment = c(ORCID = \"0000-0003-4315-6788\")), person(\"Thomas J.\", \"Faulkenberry\", , \"faulkenberry@tarleton.edu\", role = \"rev\"), person(\"Robert\", \"Garrett\", , \"rcg4@illinois.edu\", role = \"rev\") )", + "Maintainer": "Etienne Bacher ", + "Description": "A lightweight package to assist in key steps involved in any data analysis workflow: (1) wrangling the raw data to get it in the needed form, (2) applying preprocessing steps and statistical transformations, and (3) compute statistical summaries of data properties and distributions. It is also the data wrangling backend for packages in 'easystats' ecosystem. References: Patil et al. (2022) .", + "License": "MIT + file LICENSE", + "URL": "https://easystats.github.io/datawizard/", + "BugReports": "https://github.com/easystats/datawizard/issues", + "Depends": [ + "R (>= 4.0)" + ], + "Imports": [ + "insight (>= 1.2.0)", + "stats", + "utils" + ], + "Suggests": [ + "bayestestR", + "boot", + "BH", + "brms", + "curl", + "data.table", + "dplyr (>= 1.1)", + "effectsize", + "emmeans", + "gamm4", + "ggplot2 (>= 3.5.0)", + "gt", + "haven", + "httr", + "knitr", + "lme4", + "mediation", + "modelbased", + "parameters (>= 0.21.7)", + "poorman (>= 0.2.7)", + "psych", + "readxl", + "readr", + "rio", + "rmarkdown", + "rstanarm", + "see", + "testthat (>= 3.2.1)", + "tibble", + "tidyr", + "withr" + ], + "VignetteBuilder": "knitr", + "Encoding": "UTF-8", + "Language": "en-US", + "RoxygenNote": "7.3.2", + "Config/testthat/edition": "3", + "Config/testthat/parallel": "true", + "Config/Needs/website": "easystats/easystatstemplate", + "NeedsCompilation": "no", + "Author": "Indrajeet Patil [aut] (ORCID: ), Etienne Bacher [aut, cre] (ORCID: ), Dominique Makowski [aut] (ORCID: ), Daniel Lüdecke [aut] (ORCID: ), Mattan S. Ben-Shachar [aut] (ORCID: ), Brenton M. Wiernik [aut] (ORCID: ), Rémi Thériault [ctb] (ORCID: ), Thomas J. Faulkenberry [rev], Robert Garrett [rev]", + "Repository": "CRAN" }, "desc": { "Package": "desc", - "Version": "1.4.2", - "Source": "Repository", - "Repository": "CRAN", - "Hash": "6b9602c7ebbe87101a9c8edb6e8b6d21", - "Requirements": [ - "R6", - "cli", - "rprojroot" - ] - }, - "devtools": { - "Package": "devtools", - "Version": "2.4.5", - "Source": "Repository", - "Repository": "CRAN", - "Hash": "ea5bc8b4a6a01e4f12d98b58329930bb", - "Requirements": [ + "Version": "1.4.3", + "Source": "Repository", + "Title": "Manipulate DESCRIPTION Files", + "Authors@R": "c( person(\"Gábor\", \"Csárdi\", , \"csardi.gabor@gmail.com\", role = c(\"aut\", \"cre\")), person(\"Kirill\", \"Müller\", role = \"aut\"), person(\"Jim\", \"Hester\", , \"james.f.hester@gmail.com\", role = \"aut\"), person(\"Maëlle\", \"Salmon\", role = \"ctb\", comment = c(ORCID = \"0000-0002-2815-0399\")), person(\"Posit Software, PBC\", role = c(\"cph\", \"fnd\")) )", + "Maintainer": "Gábor Csárdi ", + "Description": "Tools to read, write, create, and manipulate DESCRIPTION files. It is intended for packages that create or manipulate other packages.", + "License": "MIT + file LICENSE", + "URL": "https://desc.r-lib.org/, https://github.com/r-lib/desc", + "BugReports": "https://github.com/r-lib/desc/issues", + "Depends": [ + "R (>= 3.4)" + ], + "Imports": [ "cli", - "desc", - "ellipsis", - "fs", - "lifecycle", - "memoise", - "miniUI", - "pkgbuild", - "pkgdown", - "pkgload", - "profvis", - "rcmdcheck", - "remotes", - "rlang", - "roxygen2", - "rversions", - "sessioninfo", + "R6", + "utils" + ], + "Suggests": [ + "callr", + "covr", + "gh", + "spelling", "testthat", - "urlchecker", - "usethis", + "whoami", "withr" - ] - }, - "diffobj": { - "Package": "diffobj", - "Version": "0.3.5", - "Source": "Repository", - "Repository": "CRAN", - "Hash": "bcaa8b95f8d7d01a5dedfd959ce88ab8", - "Requirements": [ - "crayon" - ] + ], + "Config/Needs/website": "tidyverse/tidytemplate", + "Config/testthat/edition": "3", + "Encoding": "UTF-8", + "Language": "en-US", + "RoxygenNote": "7.2.3", + "Collate": "'assertions.R' 'authors-at-r.R' 'built.R' 'classes.R' 'collate.R' 'constants.R' 'deps.R' 'desc-package.R' 'description.R' 'encoding.R' 'find-package-root.R' 'latex.R' 'non-oo-api.R' 'package-archives.R' 'read.R' 'remotes.R' 'str.R' 'syntax_checks.R' 'urls.R' 'utils.R' 'validate.R' 'version.R'", + "NeedsCompilation": "no", + "Author": "Gábor Csárdi [aut, cre], Kirill Müller [aut], Jim Hester [aut], Maëlle Salmon [ctb] (), Posit Software, PBC [cph, fnd]", + "Repository": "CRAN" }, "digest": { "Package": "digest", - "Version": "0.6.31", - "Source": "Repository", - "Repository": "CRAN", - "Hash": "8b708f296afd9ae69f450f9640be8990", - "Requirements": [] - }, - "downlit": { - "Package": "downlit", - "Version": "0.4.2", - "Source": "Repository", - "Repository": "CRAN", - "Hash": "79bf3f66590752ffbba20f8d2da94c7c", - "Requirements": [ - "brio", - "desc", - "digest", - "evaluate", - "fansi", - "memoise", - "rlang", - "vctrs", - "withr", - "yaml" - ] + "Version": "0.6.37", + "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", + "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", + "BugReports": "https://github.com/eddelbuettel/digest/issues", + "Depends": [ + "R (>= 3.3.0)" + ], + "Imports": [ + "utils" + ], + "License": "GPL (>= 2)", + "Suggests": [ + "tinytest", + "simplermarkdown" + ], + "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]", + "Maintainer": "Dirk Eddelbuettel ", + "Repository": "CRAN" }, "dplyr": { "Package": "dplyr", - "Version": "1.1.0", - "Source": "Repository", - "Repository": "RSPM", - "Hash": "d3c34618017e7ae252d46d79a1b9ec32", - "Requirements": [ - "R6", - "cli", + "Version": "1.1.4", + "Source": "Repository", + "Type": "Package", + "Title": "A Grammar of Data Manipulation", + "Authors@R": "c( person(\"Hadley\", \"Wickham\", , \"hadley@posit.co\", role = c(\"aut\", \"cre\"), comment = c(ORCID = \"0000-0003-4757-117X\")), person(\"Romain\", \"François\", role = \"aut\", comment = c(ORCID = \"0000-0002-2444-4226\")), person(\"Lionel\", \"Henry\", role = \"aut\"), person(\"Kirill\", \"Müller\", role = \"aut\", comment = c(ORCID = \"0000-0002-1416-3412\")), person(\"Davis\", \"Vaughan\", , \"davis@posit.co\", role = \"aut\", comment = c(ORCID = \"0000-0003-4777-038X\")), person(\"Posit Software, PBC\", role = c(\"cph\", \"fnd\")) )", + "Description": "A fast, consistent tool for working with data frame like objects, both in memory and out of memory.", + "License": "MIT + file LICENSE", + "URL": "https://dplyr.tidyverse.org, https://github.com/tidyverse/dplyr", + "BugReports": "https://github.com/tidyverse/dplyr/issues", + "Depends": [ + "R (>= 3.5.0)" + ], + "Imports": [ + "cli (>= 3.4.0)", "generics", - "glue", - "lifecycle", - "magrittr", - "pillar", - "rlang", - "tibble", - "tidyselect", - "vctrs" - ] - }, - "ellipsis": { - "Package": "ellipsis", - "Version": "0.3.2", - "Source": "Repository", - "Repository": "CRAN", - "Hash": "bb0eec2fe32e88d9e2836c2f73ea2077", - "Requirements": [ - "rlang" - ] + "glue (>= 1.3.2)", + "lifecycle (>= 1.0.3)", + "magrittr (>= 1.5)", + "methods", + "pillar (>= 1.9.0)", + "R6", + "rlang (>= 1.1.0)", + "tibble (>= 3.2.0)", + "tidyselect (>= 1.2.0)", + "utils", + "vctrs (>= 0.6.4)" + ], + "Suggests": [ + "bench", + "broom", + "callr", + "covr", + "DBI", + "dbplyr (>= 2.2.1)", + "ggplot2", + "knitr", + "Lahman", + "lobstr", + "microbenchmark", + "nycflights13", + "purrr", + "rmarkdown", + "RMySQL", + "RPostgreSQL", + "RSQLite", + "stringi (>= 1.7.6)", + "testthat (>= 3.1.5)", + "tidyr (>= 1.3.0)", + "withr" + ], + "VignetteBuilder": "knitr", + "Config/Needs/website": "tidyverse, shiny, pkgdown, tidyverse/tidytemplate", + "Config/testthat/edition": "3", + "Encoding": "UTF-8", + "LazyData": "true", + "RoxygenNote": "7.2.3", + "NeedsCompilation": "yes", + "Author": "Hadley Wickham [aut, cre] (), Romain François [aut] (), Lionel Henry [aut], Kirill Müller [aut] (), Davis Vaughan [aut] (), Posit Software, PBC [cph, fnd]", + "Maintainer": "Hadley Wickham ", + "Repository": "RSPM" }, "evaluate": { "Package": "evaluate", - "Version": "0.20", + "Version": "1.0.3", "Source": "Repository", - "Repository": "RSPM", - "Hash": "4b68aa51edd89a0e044a66e75ae3cc6c", - "Requirements": [] + "Type": "Package", + "Title": "Parsing and Evaluation Tools that Provide More Details than the Default", + "Authors@R": "c( person(\"Hadley\", \"Wickham\", , \"hadley@posit.co\", role = c(\"aut\", \"cre\")), person(\"Yihui\", \"Xie\", role = \"aut\", comment = c(ORCID = \"0000-0003-0645-5666\")), person(\"Michael\", \"Lawrence\", role = \"ctb\"), person(\"Thomas\", \"Kluyver\", role = \"ctb\"), person(\"Jeroen\", \"Ooms\", role = \"ctb\"), person(\"Barret\", \"Schloerke\", role = \"ctb\"), person(\"Adam\", \"Ryczkowski\", role = \"ctb\"), person(\"Hiroaki\", \"Yutani\", role = \"ctb\"), person(\"Michel\", \"Lang\", role = \"ctb\"), person(\"Karolis\", \"Koncevičius\", role = \"ctb\"), person(\"Posit Software, PBC\", role = c(\"cph\", \"fnd\")) )", + "Description": "Parsing and evaluation tools that make it easy to recreate the command line behaviour of R.", + "License": "MIT + file LICENSE", + "URL": "https://evaluate.r-lib.org/, https://github.com/r-lib/evaluate", + "BugReports": "https://github.com/r-lib/evaluate/issues", + "Depends": [ + "R (>= 3.6.0)" + ], + "Suggests": [ + "callr", + "covr", + "ggplot2 (>= 3.3.6)", + "lattice", + "methods", + "pkgload", + "rlang", + "knitr", + "testthat (>= 3.0.0)", + "withr" + ], + "Config/Needs/website": "tidyverse/tidytemplate", + "Config/testthat/edition": "3", + "Encoding": "UTF-8", + "RoxygenNote": "7.3.2", + "NeedsCompilation": "no", + "Author": "Hadley Wickham [aut, cre], Yihui Xie [aut] (), Michael Lawrence [ctb], Thomas Kluyver [ctb], Jeroen Ooms [ctb], Barret Schloerke [ctb], Adam Ryczkowski [ctb], Hiroaki Yutani [ctb], Michel Lang [ctb], Karolis Koncevičius [ctb], Posit Software, PBC [cph, fnd]", + "Maintainer": "Hadley Wickham ", + "Repository": "RSPM" }, "fansi": { "Package": "fansi", - "Version": "1.0.4", + "Version": "1.0.6", "Source": "Repository", - "Repository": "RSPM", - "Hash": "1d9e7ad3c8312a192dea7d3db0274fde", - "Requirements": [] + "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\" ))", + "Depends": [ + "R (>= 3.1.0)" + ], + "License": "GPL-2 | GPL-3", + "URL": "https://github.com/brodieG/fansi", + "BugReports": "https://github.com/brodieG/fansi/issues", + "VignetteBuilder": "knitr", + "Suggests": [ + "unitizer", + "knitr", + "rmarkdown" + ], + "Imports": [ + "grDevices", + "utils" + ], + "RoxygenNote": "7.2.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)", + "Maintainer": "Brodie Gaslam ", + "Repository": "RSPM" }, "farver": { "Package": "farver", - "Version": "2.1.1", + "Version": "2.1.2", "Source": "Repository", - "Repository": "RSPM", - "Hash": "8106d78941f34855c440ddb946b8f7a5", - "Requirements": [] + "Type": "Package", + "Title": "High Performance Colour Space Manipulation", + "Authors@R": "c( person(\"Thomas Lin\", \"Pedersen\", , \"thomas.pedersen@posit.co\", role = c(\"cre\", \"aut\"), comment = c(ORCID = \"0000-0002-5147-4711\")), person(\"Berendea\", \"Nicolae\", role = \"aut\", comment = \"Author of the ColorSpace C++ library\"), person(\"Romain\", \"François\", , \"romain@purrple.cat\", role = \"aut\", comment = c(ORCID = \"0000-0002-2444-4226\")), person(\"Posit, PBC\", role = c(\"cph\", \"fnd\")) )", + "Description": "The encoding of colour can be handled in many different ways, using different colour spaces. As different colour spaces have different uses, efficient conversion between these representations are important. The 'farver' package provides a set of functions that gives access to very fast colour space conversion and comparisons implemented in C++, and offers speed improvements over the 'convertColor' function in the 'grDevices' package.", + "License": "MIT + file LICENSE", + "URL": "https://farver.data-imaginist.com, https://github.com/thomasp85/farver", + "BugReports": "https://github.com/thomasp85/farver/issues", + "Suggests": [ + "covr", + "testthat (>= 3.0.0)" + ], + "Config/testthat/edition": "3", + "Encoding": "UTF-8", + "RoxygenNote": "7.3.1", + "NeedsCompilation": "yes", + "Author": "Thomas Lin Pedersen [cre, aut] (), Berendea Nicolae [aut] (Author of the ColorSpace C++ library), Romain François [aut] (), Posit, PBC [cph, fnd]", + "Maintainer": "Thomas Lin Pedersen ", + "Repository": "RSPM" }, "fastmap": { "Package": "fastmap", - "Version": "1.1.1", + "Version": "1.2.0", "Source": "Repository", - "Repository": "RSPM", - "Hash": "f7736a18de97dea803bde0a2daaafb27", - "Requirements": [] + "Title": "Fast Data Structures", + "Authors@R": "c( person(\"Winston\", \"Chang\", email = \"winston@posit.co\", role = c(\"aut\", \"cre\")), person(given = \"Posit Software, PBC\", role = c(\"cph\", \"fnd\")), person(given = \"Tessil\", role = \"cph\", comment = \"hopscotch_map library\") )", + "Description": "Fast implementation of data structures, including a key-value store, stack, and queue. Environments are commonly used as key-value stores in R, but every time a new key is used, it is added to R's global symbol table, causing a small amount of memory leakage. This can be problematic in cases where many different keys are used. Fastmap avoids this memory leak issue by implementing the map using data structures in C++.", + "License": "MIT + file LICENSE", + "Encoding": "UTF-8", + "RoxygenNote": "7.2.3", + "Suggests": [ + "testthat (>= 2.1.1)" + ], + "URL": "https://r-lib.github.io/fastmap/, https://github.com/r-lib/fastmap", + "BugReports": "https://github.com/r-lib/fastmap/issues", + "NeedsCompilation": "yes", + "Author": "Winston Chang [aut, cre], Posit Software, PBC [cph, fnd], Tessil [cph] (hopscotch_map library)", + "Maintainer": "Winston Chang ", + "Repository": "CRAN" }, "fontawesome": { "Package": "fontawesome", - "Version": "0.5.0", - "Source": "Repository", - "Repository": "RSPM", - "Hash": "e80750aec5717dedc019ad7ee40e4a7c", - "Requirements": [ - "htmltools", - "rlang" - ] + "Version": "0.5.3", + "Source": "Repository", + "Type": "Package", + "Title": "Easily Work with 'Font Awesome' Icons", + "Description": "Easily and flexibly insert 'Font Awesome' icons into 'R Markdown' documents and 'Shiny' apps. These icons can be inserted into HTML content through inline 'SVG' tags or 'i' tags. There is also a utility function for exporting 'Font Awesome' icons as 'PNG' images for those situations where raster graphics are needed.", + "Authors@R": "c( person(\"Richard\", \"Iannone\", , \"rich@posit.co\", c(\"aut\", \"cre\"), comment = c(ORCID = \"0000-0003-3925-190X\")), person(\"Christophe\", \"Dervieux\", , \"cderv@posit.co\", role = \"ctb\", comment = c(ORCID = \"0000-0003-4474-2498\")), person(\"Winston\", \"Chang\", , \"winston@posit.co\", role = \"ctb\"), person(\"Dave\", \"Gandy\", role = c(\"ctb\", \"cph\"), comment = \"Font-Awesome font\"), person(\"Posit Software, PBC\", role = c(\"cph\", \"fnd\")) )", + "License": "MIT + file LICENSE", + "URL": "https://github.com/rstudio/fontawesome, https://rstudio.github.io/fontawesome/", + "BugReports": "https://github.com/rstudio/fontawesome/issues", + "Encoding": "UTF-8", + "ByteCompile": "true", + "RoxygenNote": "7.3.2", + "Depends": [ + "R (>= 3.3.0)" + ], + "Imports": [ + "rlang (>= 1.0.6)", + "htmltools (>= 0.5.1.1)" + ], + "Suggests": [ + "covr", + "dplyr (>= 1.0.8)", + "gt (>= 0.9.0)", + "knitr (>= 1.31)", + "testthat (>= 3.0.0)", + "rsvg" + ], + "Config/testthat/edition": "3", + "NeedsCompilation": "no", + "Author": "Richard Iannone [aut, cre] (), Christophe Dervieux [ctb] (), Winston Chang [ctb], Dave Gandy [ctb, cph] (Font-Awesome font), Posit Software, PBC [cph, fnd]", + "Maintainer": "Richard Iannone ", + "Repository": "CRAN" }, "forcats": { "Package": "forcats", "Version": "1.0.0", "Source": "Repository", - "Repository": "RSPM", - "Hash": "1a0a9a3d5083d0d573c4214576f1e690", - "Requirements": [ - "cli", + "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\")) )", + "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)" + ], + "Imports": [ + "cli (>= 3.4.0)", "glue", "lifecycle", "magrittr", - "rlang", + "rlang (>= 1.0.0)", "tibble" - ] + ], + "Suggests": [ + "covr", + "dplyr", + "ggplot2", + "knitr", + "readr", + "rmarkdown", + "testthat (>= 3.0.0)", + "withr" + ], + "VignetteBuilder": "knitr", + "Config/Needs/website": "tidyverse/tidytemplate", + "Config/testthat/edition": "3", + "Encoding": "UTF-8", + "LazyData": "true", + "RoxygenNote": "7.2.3", + "NeedsCompilation": "no", + "Author": "Hadley Wickham [aut, cre], RStudio [cph, fnd]", + "Maintainer": "Hadley Wickham ", + "Repository": "RSPM" }, "fs": { "Package": "fs", - "Version": "1.6.1", - "Source": "Repository", - "Repository": "RSPM", - "Hash": "f4dcd23b67e33d851d2079f703e8b985", - "Requirements": [] + "Version": "1.6.5", + "Source": "Repository", + "Title": "Cross-Platform File System Operations Based on 'libuv'", + "Authors@R": "c( person(\"Jim\", \"Hester\", role = \"aut\"), person(\"Hadley\", \"Wickham\", , \"hadley@posit.co\", role = \"aut\"), person(\"Gábor\", \"Csárdi\", , \"csardi.gabor@gmail.com\", role = c(\"aut\", \"cre\")), person(\"libuv project contributors\", role = \"cph\", comment = \"libuv library\"), person(\"Joyent, Inc. and other Node contributors\", role = \"cph\", comment = \"libuv library\"), person(\"Posit Software, PBC\", role = c(\"cph\", \"fnd\")) )", + "Description": "A cross-platform interface to file system operations, built on top of the 'libuv' C library.", + "License": "MIT + file LICENSE", + "URL": "https://fs.r-lib.org, https://github.com/r-lib/fs", + "BugReports": "https://github.com/r-lib/fs/issues", + "Depends": [ + "R (>= 3.6)" + ], + "Imports": [ + "methods" + ], + "Suggests": [ + "covr", + "crayon", + "knitr", + "pillar (>= 1.0.0)", + "rmarkdown", + "spelling", + "testthat (>= 3.0.0)", + "tibble (>= 1.1.0)", + "vctrs (>= 0.3.0)", + "withr" + ], + "VignetteBuilder": "knitr", + "ByteCompile": "true", + "Config/Needs/website": "tidyverse/tidytemplate", + "Config/testthat/edition": "3", + "Copyright": "file COPYRIGHTS", + "Encoding": "UTF-8", + "Language": "en-US", + "RoxygenNote": "7.2.3", + "SystemRequirements": "GNU make", + "NeedsCompilation": "yes", + "Author": "Jim Hester [aut], Hadley Wickham [aut], Gábor Csárdi [aut, cre], libuv project contributors [cph] (libuv library), Joyent, Inc. and other Node contributors [cph] (libuv library), Posit Software, PBC [cph, fnd]", + "Maintainer": "Gábor Csárdi ", + "Repository": "CRAN" }, "generics": { "Package": "generics", "Version": "0.1.3", "Source": "Repository", - "Repository": "CRAN", - "Hash": "15e9634c0fcd294799e9b2e929ed1b86", - "Requirements": [] - }, - "gert": { - "Package": "gert", - "Version": "1.9.2", - "Source": "Repository", - "Repository": "CRAN", - "Hash": "9122b3958e749badb5c939f498038b57", - "Requirements": [ - "askpass", - "credentials", - "openssl", - "rstudioapi", - "sys", - "zip" - ] + "Title": "Common S3 Generics not Provided by Base R Methods Related to Model Fitting", + "Authors@R": "c( person(\"Hadley\", \"Wickham\", , \"hadley@rstudio.com\", role = c(\"aut\", \"cre\")), person(\"Max\", \"Kuhn\", , \"max@rstudio.com\", role = \"aut\"), person(\"Davis\", \"Vaughan\", , \"davis@rstudio.com\", role = \"aut\"), person(\"RStudio\", role = \"cph\") )", + "Description": "In order to reduce potential package dependencies and conflicts, generics provides a number of commonly used S3 generics.", + "License": "MIT + file LICENSE", + "URL": "https://generics.r-lib.org, https://github.com/r-lib/generics", + "BugReports": "https://github.com/r-lib/generics/issues", + "Depends": [ + "R (>= 3.2)" + ], + "Imports": [ + "methods" + ], + "Suggests": [ + "covr", + "pkgload", + "testthat (>= 3.0.0)", + "tibble", + "withr" + ], + "Config/Needs/website": "tidyverse/tidytemplate", + "Config/testthat/edition": "3", + "Encoding": "UTF-8", + "RoxygenNote": "7.2.0", + "NeedsCompilation": "no", + "Author": "Hadley Wickham [aut, cre], Max Kuhn [aut], Davis Vaughan [aut], RStudio [cph]", + "Maintainer": "Hadley Wickham ", + "Repository": "RSPM" }, "ggcorrplot": { "Package": "ggcorrplot", - "Version": "0.1.4", - "Source": "Repository", - "Repository": "RSPM", - "Hash": "463c9147c97479678b40bbf621a10635", - "Requirements": [ - "ggplot2", - "reshape2" - ] + "Version": "0.1.4.1", + "Source": "Repository", + "Type": "Package", + "Title": "Visualization of a Correlation Matrix using 'ggplot2'", + "Authors@R": "c(person(given = \"Alboukadel\", family = \"Kassambara\", role = c(\"aut\", \"cre\"), email = \"alboukadel.kassambara@gmail.com\"), person(given = \"Indrajeet\", family = \"Patil\", role = \"ctb\", email = \"patilindrajeet.science@gmail.com\", comment = c(ORCID = \"0000-0003-1995-6531\", Twitter = \"@patilindrajeets\")))", + "Description": "The 'ggcorrplot' package can be used to visualize easily a correlation matrix using 'ggplot2'. It provides a solution for reordering the correlation matrix and displays the significance level on the plot. It also includes a function for computing a matrix of correlation p-values.", + "License": "GPL-2", + "URL": "http://www.sthda.com/english/wiki/ggcorrplot-visualization-of-a-correlation-matrix-using-ggplot2", + "BugReports": "https://github.com/kassambara/ggcorrplot/issues", + "Depends": [ + "R (>= 3.3)", + "ggplot2 (>= 3.3.6)" + ], + "Imports": [ + "reshape2", + "stats" + ], + "Suggests": [ + "testthat (>= 3.0.0)", + "knitr", + "spelling", + "vdiffr (>= 1.0.0)" + ], + "Encoding": "UTF-8", + "Language": "en-US", + "RoxygenNote": "7.1.0", + "Config/testthat/edition": "3", + "NeedsCompilation": "no", + "Author": "Alboukadel Kassambara [aut, cre], Indrajeet Patil [ctb] (, @patilindrajeets)", + "Maintainer": "Alboukadel Kassambara ", + "Repository": "CRAN" }, "ggplot2": { "Package": "ggplot2", - "Version": "3.4.1", - "Source": "Repository", - "Repository": "RSPM", - "Hash": "d494daf77c4aa7f084dbbe6ca5dcaca7", - "Requirements": [ - "MASS", + "Version": "3.5.2", + "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\")) )", + "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)" + ], + "Imports": [ "cli", "glue", - "gtable", + "grDevices", + "grid", + "gtable (>= 0.1.1)", "isoband", - "lifecycle", + "lifecycle (> 1.0.1)", + "MASS", "mgcv", - "rlang", - "scales", + "rlang (>= 1.1.0)", + "scales (>= 1.3.0)", + "stats", "tibble", - "vctrs", - "withr" - ] - }, - "gh": { - "Package": "gh", - "Version": "1.4.0", - "Source": "Repository", - "Repository": "RSPM", - "Hash": "03533b1c875028233598f848fda44c4c", - "Requirements": [ + "vctrs (>= 0.6.0)", + "withr (>= 2.5.0)" + ], + "Suggests": [ + "covr", + "dplyr", + "ggplot2movies", + "hexbin", + "Hmisc", + "knitr", + "mapproj", + "maps", + "multcomp", + "munsell", + "nlme", + "profvis", + "quantreg", + "ragg (>= 1.2.6)", + "RColorBrewer", + "rmarkdown", + "rpart", + "sf (>= 0.7-3)", + "svglite (>= 2.1.2)", + "testthat (>= 3.1.2)", + "vdiffr (>= 1.0.6)", + "xml2" + ], + "Enhances": [ + "sp" + ], + "VignetteBuilder": "knitr", + "Config/Needs/website": "ggtext, tidyr, forcats, tidyverse/tidytemplate", + "Config/testthat/edition": "3", + "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'", + "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]", + "Maintainer": "Thomas Lin Pedersen ", + "Repository": "RSPM" + }, + "ggstats": { + "Package": "ggstats", + "Version": "0.9.0", + "Source": "Repository", + "Type": "Package", + "Title": "Extension to 'ggplot2' for Plotting Stats", + "Authors@R": "c( person( \"Joseph\", \"Larmarange\", , \"joseph@larmarange.net\", role = c(\"aut\", \"cre\"), comment = c(ORCID = \"0000-0001-7097-700X\") ) )", + "Description": "Provides new statistics, new geometries and new positions for 'ggplot2' and a suite of functions to facilitate the creation of statistical plots.", + "License": "GPL (>= 3)", + "URL": "https://larmarange.github.io/ggstats/, https://github.com/larmarange/ggstats", + "BugReports": "https://github.com/larmarange/ggstats/issues", + "Depends": [ + "R (>= 4.2)" + ], + "Imports": [ "cli", - "gitcreds", - "httr2", - "ini", - "jsonlite", - "rlang" - ] - }, - "ghql": { - "Package": "ghql", - "Version": "0.1.0", - "Source": "Repository", - "Repository": "CRAN", - "Hash": "aa13ce03131717aa76a44259460ece6b", - "Requirements": [ - "R6", - "crul", - "graphql", - "jsonlite" - ] - }, - "gitcreds": { - "Package": "gitcreds", - "Version": "0.1.2", + "dplyr", + "forcats", + "ggplot2 (>= 3.4.0)", + "lifecycle", + "patchwork", + "purrr", + "rlang", + "scales", + "stats", + "stringr", + "utils", + "tidyr" + ], + "Suggests": [ + "betareg", + "broom", + "broom.helpers (>= 1.20.0)", + "emmeans", + "glue", + "gtsummary", + "knitr", + "labelled (>= 2.11.0)", + "reshape", + "rmarkdown", + "nnet", + "parameters", + "pscl", + "testthat (>= 3.0.0)", + "spelling", + "survey", + "survival", + "vdiffr" + ], + "Encoding": "UTF-8", + "RoxygenNote": "7.3.2", + "Config/testthat/edition": "3", + "Language": "en-US", + "VignetteBuilder": "knitr", + "NeedsCompilation": "no", + "Author": "Joseph Larmarange [aut, cre] ()", + "Maintainer": "Joseph Larmarange ", + "Repository": "CRAN" + }, + "ggsurvfit": { + "Package": "ggsurvfit", + "Version": "1.1.0", "Source": "Repository", - "Repository": "CRAN", - "Hash": "ab08ac61f3e1be454ae21911eb8bc2fe", - "Requirements": [] + "Title": "Flexible Time-to-Event Figures", + "Authors@R": "c( person(\"Daniel D.\", \"Sjoberg\", , \"danield.sjoberg@gmail.com\", role = c(\"aut\", \"cre\", \"cph\"), comment = c(ORCID = \"0000-0003-0862-2018\")), person(\"Mark\", \"Baillie\", , \"bailliem@gmail.com\", role = \"aut\"), person(\"Charlotta\", \"Fruechtenicht\", , \"charlotta.fruechtenicht@roche.com\", role = \"aut\", comment = c(ORCID = \"0000-0002-6689-6423\")), person(\"Steven\", \"Haesendonckx\", , \"shaesen2@its.jnj.com\", role = \"aut\", comment = c(ORCID = \"0000-0001-8222-3686\")), person(\"Tim\", \"Treis\", , \"tim.treis@outlook.de\", role = \"aut\", comment = c(ORCID = \"0000-0002-9686-4799\")) )", + "Description": "Ease the creation of time-to-event (i.e. survival) endpoint figures. The modular functions create figures ready for publication. Each of the functions that add to or modify the figure are written as proper 'ggplot2' geoms or stat methods, allowing the functions from this package to be combined with any function or customization from 'ggplot2' and other 'ggplot2' extension packages.", + "License": "MIT + file LICENSE", + "URL": "https://github.com/pharmaverse/ggsurvfit, https://www.danieldsjoberg.com/ggsurvfit/", + "BugReports": "https://github.com/pharmaverse/ggsurvfit/issues", + "Depends": [ + "R (>= 3.5)" + ], + "Imports": [ + "broom (>= 1.0.0)", + "cli (>= 3.0.0)", + "dplyr (>= 1.0.3)", + "ggplot2 (>= 3.5.0)", + "glue (>= 1.6.0)", + "gtable", + "patchwork (>= 1.1.0)", + "rlang (>= 1.0.0)", + "survival (>= 3.6-4)", + "tidyr (>= 1.0.0)" + ], + "Suggests": [ + "covr", + "knitr", + "rmarkdown", + "scales (>= 1.1.0)", + "spelling", + "testthat (>= 3.2.0)", + "tidycmprsk (>= 1.0.0)", + "vdiffr (>= 1.0.0)", + "withr" + ], + "VignetteBuilder": "knitr", + "Config/Needs/website": "cowplot, ggeasy, gghighlight", + "Config/testthat/edition": "3", + "Encoding": "UTF-8", + "Language": "en-US", + "LazyData": "true", + "RoxygenNote": "7.3.1", + "NeedsCompilation": "no", + "Author": "Daniel D. Sjoberg [aut, cre, cph] (), Mark Baillie [aut], Charlotta Fruechtenicht [aut] (), Steven Haesendonckx [aut] (), Tim Treis [aut] ()", + "Maintainer": "Daniel D. Sjoberg ", + "Repository": "RSPM" }, "glue": { "Package": "glue", - "Version": "1.6.2", - "Source": "Repository", - "Repository": "CRAN", - "Hash": "4f2596dfb05dac67b9dc558e5c6fba2e", - "Requirements": [] + "Version": "1.8.0", + "Source": "Repository", + "Title": "Interpreted String Literals", + "Authors@R": "c( person(\"Jim\", \"Hester\", role = \"aut\", comment = c(ORCID = \"0000-0002-2739-7082\")), person(\"Jennifer\", \"Bryan\", , \"jenny@posit.co\", role = c(\"aut\", \"cre\"), comment = c(ORCID = \"0000-0002-6983-2759\")), person(\"Posit Software, PBC\", role = c(\"cph\", \"fnd\")) )", + "Description": "An implementation of interpreted string literals, inspired by Python's Literal String Interpolation and Docstrings and Julia's Triple-Quoted String Literals .", + "License": "MIT + file LICENSE", + "URL": "https://glue.tidyverse.org/, https://github.com/tidyverse/glue", + "BugReports": "https://github.com/tidyverse/glue/issues", + "Depends": [ + "R (>= 3.6)" + ], + "Imports": [ + "methods" + ], + "Suggests": [ + "crayon", + "DBI (>= 1.2.0)", + "dplyr", + "knitr", + "magrittr", + "rlang", + "rmarkdown", + "RSQLite", + "testthat (>= 3.2.0)", + "vctrs (>= 0.3.0)", + "waldo (>= 0.5.3)", + "withr" + ], + "VignetteBuilder": "knitr", + "ByteCompile": "true", + "Config/Needs/website": "bench, forcats, ggbeeswarm, ggplot2, R.utils, rprintf, tidyr, tidyverse/tidytemplate", + "Config/testthat/edition": "3", + "Encoding": "UTF-8", + "RoxygenNote": "7.3.2", + "NeedsCompilation": "yes", + "Author": "Jim Hester [aut] (), Jennifer Bryan [aut, cre] (), Posit Software, PBC [cph, fnd]", + "Maintainer": "Jennifer Bryan ", + "Repository": "CRAN" }, "golem": { - "Package": "golem", - "Version": "0.3.5", - "Source": "Repository", - "Repository": "CRAN", - "Hash": "c4fbd853653f38cccdd009d75abb344c", - "Requirements": [ - "attempt", - "cli", + "Package": "golem", + "Version": "0.5.1", + "Source": "Repository", + "Title": "A Framework for Robust Shiny Applications", + "Authors@R": "c( person(\"Colin\", \"Fay\", , \"contact@colinfay.me\", role = c(\"cre\", \"aut\"), comment = c(ORCID = \"0000-0001-7343-1846\")), person(\"Vincent\", \"Guyader\", , \"vincent@thinkr.fr\", role = \"aut\", comment = c(ORCID = \"0000-0003-0671-9270\", \"previous maintainer\")), person(\"Sébastien\", \"Rochette\", , \"sebastien@thinkr.fr\", role = \"aut\", comment = c(ORCID = \"0000-0002-1565-9313\")), person(\"Cervan\", \"Girard\", , \"cervan@thinkr.fr\", role = \"aut\", comment = c(ORCID = \"0000-0002-4816-4624\")), person(\"Novica\", \"Nakov\", , \"nnovica@gmail.com\", role = \"ctb\"), person(\"David\", \"Granjon\", , \"dgranjon@ymail.com\", role = \"ctb\"), person(\"Arthur\", \"Bréant\", , \"arthur@thinkr.fr\", role = \"ctb\"), person(\"Antoine\", \"Languillaume\", , \"antoine@thinkr.fr\", role = \"ctb\"), person(\"Ilya\", \"Zarubin\", , \"zarubin@wiso.uni-koeln.de\", role = \"ctb\"), person(\"ThinkR\", role = \"cph\") )", + "Description": "An opinionated framework for building a production-ready 'Shiny' application. This package contains a series of tools for building a robust 'Shiny' application from start to finish.", + "License": "MIT + file LICENSE", + "URL": "https://thinkr-open.github.io/golem/, https://github.com/ThinkR-open/golem", + "BugReports": "https://github.com/ThinkR-open/golem/issues", + "Depends": [ + "R (>= 3.5.0)" + ], + "Imports": [ + "attempt (>= 0.3.0)", "config", + "here", + "htmltools", + "rlang (>= 1.0.0)", + "shiny (>= 1.5.0)", + "utils", + "yaml" + ], + "Suggests": [ + "attachment (>= 0.3.2)", + "callr", + "cli (>= 2.0.0)", + "covr", "crayon", "desc", + "devtools", + "dockerfiler (>= 0.2.0)", "fs", - "here", - "htmltools", - "pkgload", + "httpuv", + "knitr", + "mockery", + "pkgbuild", + "pkgdown", + "pkgload (>= 1.3.0)", + "processx", + "purrr", + "rcmdcheck", + "remotes", + "renv", + "rmarkdown", "roxygen2", + "rsconnect", "rstudioapi", - "shiny", - "usethis", - "yaml" - ] - }, - "graphql": { - "Package": "graphql", - "Version": "1.5.1", - "Source": "Repository", - "Repository": "CRAN", - "Hash": "dbaea71ccb07059f40ea9a739cc72279", - "Requirements": [ - "Rcpp", - "jsonlite" - ] + "sass", + "spelling", + "stringr", + "testthat (>= 3.0.0)", + "tools", + "usethis (>= 1.6.0)", + "withr" + ], + "VignetteBuilder": "knitr", + "Config/testthat/edition": "3", + "Config/testthat/parallel": "true", + "Encoding": "UTF-8", + "Language": "en-US", + "RoxygenNote": "7.3.2", + "NeedsCompilation": "no", + "Author": "Colin Fay [cre, aut] (), Vincent Guyader [aut] (, previous maintainer), Sébastien Rochette [aut] (), Cervan Girard [aut] (), Novica Nakov [ctb], David Granjon [ctb], Arthur Bréant [ctb], Antoine Languillaume [ctb], Ilya Zarubin [ctb], ThinkR [cph]", + "Maintainer": "Colin Fay ", + "Repository": "CRAN" }, "gt": { "Package": "gt", - "Version": "0.8.0", + "Version": "1.0.0", "Source": "Repository", - "Repository": "RSPM", - "Hash": "d100be8d1f54dc589cc8d63366839287", - "Requirements": [ - "base64enc", - "bigD", - "bitops", - "cli", - "commonmark", - "dplyr", - "fs", + "Type": "Package", + "Title": "Easily Create Presentation-Ready Display Tables", + "Authors@R": "c( person(\"Richard\", \"Iannone\", , \"rich@posit.co\", role = c(\"aut\", \"cre\"), comment = c(ORCID = \"0000-0003-3925-190X\")), person(\"Joe\", \"Cheng\", , \"joe@posit.co\", role = \"aut\"), person(\"Barret\", \"Schloerke\", , \"barret@posit.co\", role = \"aut\", comment = c(ORCID = \"0000-0001-9986-114X\")), person(\"Ellis\", \"Hughes\", , \"ellis.h.hughes@gsk.com\", role = \"aut\", comment = c(ORCID = \"0000-0003-0637-4436\")), person(\"Alexandra\", \"Lauer\", , \"alexandralauer1@gmail.com\", role = \"aut\", comment = c(ORCID = \"0000-0002-4191-6301\")), person(\"JooYoung\", \"Seo\", , \"jseo1005@illinois.edu\", role = \"aut\", comment = c(ORCID = \"0000-0002-4064-6012\")), person(\"Ken\", \"Brevoort\", , \"ken@brevoort.com\", role = \"aut\", comment = c(ORCID = \"0000-0002-4001-8358\")), person(\"Olivier\", \"Roy\", role = \"aut\"), person(\"Posit Software, PBC\", role = c(\"cph\", \"fnd\")) )", + "Description": "Build display tables from tabular data with an easy-to-use set of functions. With its progressive approach, we can construct display tables with a cohesive set of table parts. Table values can be formatted using any of the included formatting functions. Footnotes and cell styles can be precisely added through a location targeting system. The way in which 'gt' handles things for you means that you don't often have to worry about the fine details.", + "License": "MIT + file LICENSE", + "URL": "https://gt.rstudio.com, https://github.com/rstudio/gt", + "BugReports": "https://github.com/rstudio/gt/issues", + "Depends": [ + "R (>= 3.6.0)" + ], + "Imports": [ + "base64enc (>= 0.1-3)", + "bigD (>= 0.2)", + "bitops (>= 1.0-7)", + "cli (>= 3.6.3)", + "commonmark (>= 1.9.1)", + "dplyr (>= 1.1.4)", + "fs (>= 1.6.4)", + "glue (>= 1.8.0)", + "htmltools (>= 0.5.8.1)", + "htmlwidgets (>= 1.6.4)", + "juicyjuice (>= 0.1.0)", + "magrittr (>= 2.0.3)", + "markdown (>= 1.13)", + "reactable (>= 0.4.4)", + "rlang (>= 1.1.4)", + "sass (>= 0.4.9)", + "scales (>= 1.3.0)", + "tidyselect (>= 1.2.1)", + "vctrs", + "xml2 (>= 1.3.6)" + ], + "Suggests": [ + "fontawesome (>= 0.5.2)", "ggplot2", - "glue", - "htmltools", - "juicyjuice", - "magrittr", - "rlang", - "sass", - "scales", - "tibble", - "tidyselect" - ] + "grid", + "gtable (>= 0.3.6)", + "katex (>= 1.4.1)", + "knitr", + "lubridate", + "magick", + "paletteer", + "RColorBrewer", + "rmarkdown (>= 2.20)", + "rsvg", + "rvest", + "shiny (>= 1.9.1)", + "testthat (>= 3.1.9)", + "tidyr (>= 1.0.0)", + "webshot2 (>= 0.1.0)", + "withr" + ], + "Config/Needs/coverage": "officer", + "Config/Needs/website": "quarto", + "ByteCompile": "true", + "Config/testthat/edition": "3", + "Config/testthat/parallel": "true", + "Encoding": "UTF-8", + "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]", + "Maintainer": "Richard Iannone ", + "Repository": "CRAN" }, "gtable": { "Package": "gtable", - "Version": "0.3.1", + "Version": "0.3.6", "Source": "Repository", - "Repository": "CRAN", - "Hash": "36b4265fb818f6a342bed217549cd896", - "Requirements": [] + "Title": "Arrange 'Grobs' in Tables", + "Authors@R": "c( person(\"Hadley\", \"Wickham\", , \"hadley@posit.co\", role = \"aut\"), person(\"Thomas Lin\", \"Pedersen\", , \"thomas.pedersen@posit.co\", role = c(\"aut\", \"cre\")), person(\"Posit Software, PBC\", role = c(\"cph\", \"fnd\")) )", + "Description": "Tools to make it easier to work with \"tables\" of 'grobs'. The 'gtable' package defines a 'gtable' grob class that specifies a grid along with a list of grobs and their placement in the grid. Further the package makes it easy to manipulate and combine 'gtable' objects so that complex compositions can be built up sequentially.", + "License": "MIT + file LICENSE", + "URL": "https://gtable.r-lib.org, https://github.com/r-lib/gtable", + "BugReports": "https://github.com/r-lib/gtable/issues", + "Depends": [ + "R (>= 4.0)" + ], + "Imports": [ + "cli", + "glue", + "grid", + "lifecycle", + "rlang (>= 1.1.0)", + "stats" + ], + "Suggests": [ + "covr", + "ggplot2", + "knitr", + "profvis", + "rmarkdown", + "testthat (>= 3.0.0)" + ], + "VignetteBuilder": "knitr", + "Config/Needs/website": "tidyverse/tidytemplate", + "Config/testthat/edition": "3", + "Config/usethis/last-upkeep": "2024-10-25", + "Encoding": "UTF-8", + "RoxygenNote": "7.3.2", + "NeedsCompilation": "no", + "Author": "Hadley Wickham [aut], Thomas Lin Pedersen [aut, cre], Posit Software, PBC [cph, fnd]", + "Maintainer": "Thomas Lin Pedersen ", + "Repository": "RSPM" + }, + "gtsummary": { + "Package": "gtsummary", + "Version": "2.4.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(\"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/", + "BugReports": "https://github.com/ddsjoberg/gtsummary/issues", + "Depends": [ + "R (>= 4.2)" + ], + "Imports": [ + "cards (>= 0.7.0)", + "cardx (>= 0.3.0)", + "cli (>= 3.6.3)", + "dplyr (>= 1.1.3)", + "glue (>= 1.8.0)", + "gt (>= 0.11.1)", + "lifecycle (>= 1.0.3)", + "rlang (>= 1.1.1)", + "tidyr (>= 1.3.0)", + "vctrs (>= 0.6.4)" + ], + "Suggests": [ + "aod (>= 1.3.3)", + "broom (>= 1.0.5)", + "broom.helpers (>= 1.20.0)", + "broom.mixed (>= 0.2.9)", + "car (>= 3.0-11)", + "cmprsk", + "effectsize (>= 0.6.0)", + "emmeans (>= 1.7.3)", + "flextable (>= 0.8.1)", + "geepack (>= 1.3.10)", + "ggstats (>= 0.2.1)", + "huxtable (>= 5.4.0)", + "insight (>= 0.15.0)", + "kableExtra (>= 1.3.4)", + "knitr (>= 1.37)", + "lme4 (>= 1.1-31)", + "mice (>= 3.10.0)", + "nnet", + "officer", + "openxlsx", + "parameters (>= 0.20.2)", + "parsnip (>= 0.1.7)", + "rmarkdown", + "smd (>= 0.6.6)", + "spelling", + "survey (>= 4.2)", + "survival (>= 3.6-4)", + "testthat (>= 3.2.0)", + "withr (>= 2.5.0)", + "workflows (>= 0.2.4)" + ], + "VignetteBuilder": "knitr", + "Config/Needs/check": "hms", + "Config/Needs/website": "forcats, sandwich, scales", + "Config/testthat/edition": "3", + "Config/testthat/parallel": "true", + "Encoding": "UTF-8", + "Language": "en-US", + "LazyData": "true", + "RoxygenNote": "7.3.2", + "NeedsCompilation": "no", + "Author": "Daniel D. Sjoberg [aut, cre] (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": "RSPM" }, "haven": { "Package": "haven", - "Version": "2.5.2", - "Source": "Repository", - "Repository": "RSPM", - "Hash": "8b331e659e67d757db0fcc28e689c501", - "Requirements": [ - "cli", - "cpp11", - "forcats", + "Version": "2.5.4", + "Source": "Repository", + "Title": "Import and Export 'SPSS', 'Stata' and 'SAS' Files", + "Authors@R": "c( person(\"Hadley\", \"Wickham\", , \"hadley@posit.co\", role = c(\"aut\", \"cre\")), person(\"Evan\", \"Miller\", role = c(\"aut\", \"cph\"), comment = \"Author of included ReadStat code\"), person(\"Danny\", \"Smith\", role = \"aut\"), person(\"Posit Software, PBC\", role = c(\"cph\", \"fnd\")) )", + "Description": "Import foreign statistical formats into R via the embedded 'ReadStat' C library, .", + "License": "MIT + file LICENSE", + "URL": "https://haven.tidyverse.org, https://github.com/tidyverse/haven, https://github.com/WizardMac/ReadStat", + "BugReports": "https://github.com/tidyverse/haven/issues", + "Depends": [ + "R (>= 3.6)" + ], + "Imports": [ + "cli (>= 3.0.0)", + "forcats (>= 0.2.0)", "hms", "lifecycle", - "readr", - "rlang", + "methods", + "readr (>= 0.1.0)", + "rlang (>= 0.4.0)", "tibble", "tidyselect", - "vctrs" - ] + "vctrs (>= 0.3.0)" + ], + "Suggests": [ + "covr", + "crayon", + "fs", + "knitr", + "pillar (>= 1.4.0)", + "rmarkdown", + "testthat (>= 3.0.0)", + "utf8" + ], + "LinkingTo": [ + "cpp11" + ], + "VignetteBuilder": "knitr", + "Config/Needs/website": "tidyverse/tidytemplate", + "Config/testthat/edition": "3", + "Encoding": "UTF-8", + "RoxygenNote": "7.2.3", + "SystemRequirements": "GNU make, zlib: zlib1g-dev (deb), zlib-devel (rpm)", + "NeedsCompilation": "yes", + "Author": "Hadley Wickham [aut, cre], Evan Miller [aut, cph] (Author of included ReadStat code), Danny Smith [aut], Posit Software, PBC [cph, fnd]", + "Maintainer": "Hadley Wickham ", + "Repository": "RSPM" }, "here": { "Package": "here", "Version": "1.0.1", "Source": "Repository", - "Repository": "CRAN", - "Hash": "24b224366f9c2e7534d2344d10d59211", - "Requirements": [ - "rprojroot" - ] + "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\")))", + "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)" + ], + "Suggests": [ + "conflicted", + "covr", + "fs", + "knitr", + "palmerpenguins", + "plyr", + "readr", + "rlang", + "rmarkdown", + "testthat", + "uuid", + "withr" + ], + "VignetteBuilder": "knitr", + "Encoding": "UTF-8", + "LazyData": "true", + "RoxygenNote": "7.1.1.9000", + "Config/testthat/edition": "3", + "NeedsCompilation": "no", + "Author": "Kirill Müller [aut, cre] (), Jennifer Bryan [ctb] ()", + "Maintainer": "Kirill Müller ", + "Repository": "CRAN" }, "highr": { "Package": "highr", - "Version": "0.10", - "Source": "Repository", - "Repository": "CRAN", - "Hash": "06230136b2d2b9ba5805e1963fa6e890", - "Requirements": [ - "xfun" - ] + "Version": "0.11", + "Source": "Repository", + "Type": "Package", + "Title": "Syntax Highlighting for R Source Code", + "Authors@R": "c( person(\"Yihui\", \"Xie\", role = c(\"aut\", \"cre\"), email = \"xie@yihui.name\", comment = c(ORCID = \"0000-0003-0645-5666\")), person(\"Yixuan\", \"Qiu\", role = \"aut\"), person(\"Christopher\", \"Gandrud\", role = \"ctb\"), person(\"Qiang\", \"Li\", role = \"ctb\") )", + "Description": "Provides syntax highlighting for R source code. Currently it supports LaTeX and HTML output. Source code of other languages is supported via Andre Simon's highlight package ().", + "Depends": [ + "R (>= 3.3.0)" + ], + "Imports": [ + "xfun (>= 0.18)" + ], + "Suggests": [ + "knitr", + "markdown", + "testit" + ], + "License": "GPL", + "URL": "https://github.com/yihui/highr", + "BugReports": "https://github.com/yihui/highr/issues", + "VignetteBuilder": "knitr", + "Encoding": "UTF-8", + "RoxygenNote": "7.3.1", + "NeedsCompilation": "no", + "Author": "Yihui Xie [aut, cre] (), Yixuan Qiu [aut], Christopher Gandrud [ctb], Qiang Li [ctb]", + "Maintainer": "Yihui Xie ", + "Repository": "RSPM" }, "hms": { "Package": "hms", - "Version": "1.1.2", + "Version": "1.1.3", "Source": "Repository", - "Repository": "CRAN", - "Hash": "41100392191e1244b887878b533eea91", - "Requirements": [ - "ellipsis", + "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\") )", + "Description": "Implements an S3 class for storing and formatting time-of-day values, based on the 'difftime' class.", + "Imports": [ "lifecycle", + "methods", "pkgconfig", - "rlang", - "vctrs" - ] + "rlang (>= 1.0.2)", + "vctrs (>= 0.3.8)" + ], + "Suggests": [ + "crayon", + "lubridate", + "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", + "NeedsCompilation": "no", + "Author": "Kirill Müller [aut, cre] (), R Consortium [fnd], RStudio [fnd]", + "Maintainer": "Kirill Müller ", + "Repository": "RSPM" }, "htmltools": { "Package": "htmltools", - "Version": "0.5.4", - "Source": "Repository", - "Repository": "CRAN", - "Hash": "9d27e99cc90bd701c0a7a63e5923f9b7", - "Requirements": [ + "Version": "0.5.8.1", + "Source": "Repository", + "Type": "Package", + "Title": "Tools for HTML", + "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(\"Barret\", \"Schloerke\", , \"barret@posit.co\", role = \"aut\", comment = c(ORCID = \"0000-0001-9986-114X\")), person(\"Winston\", \"Chang\", , \"winston@posit.co\", role = \"aut\", comment = c(ORCID = \"0000-0002-1576-2126\")), person(\"Yihui\", \"Xie\", , \"yihui@posit.co\", role = \"aut\"), person(\"Jeff\", \"Allen\", role = \"aut\"), person(\"Posit Software, PBC\", role = c(\"cph\", \"fnd\")) )", + "Description": "Tools for HTML generation and output.", + "License": "GPL (>= 2)", + "URL": "https://github.com/rstudio/htmltools, https://rstudio.github.io/htmltools/", + "BugReports": "https://github.com/rstudio/htmltools/issues", + "Depends": [ + "R (>= 2.14.1)" + ], + "Imports": [ "base64enc", "digest", - "ellipsis", - "fastmap", - "rlang" - ] + "fastmap (>= 1.1.0)", + "grDevices", + "rlang (>= 1.0.0)", + "utils" + ], + "Suggests": [ + "Cairo", + "markdown", + "ragg", + "shiny", + "testthat", + "withr" + ], + "Enhances": [ + "knitr" + ], + "Config/Needs/check": "knitr", + "Config/Needs/website": "rstudio/quillt, bench", + "Encoding": "UTF-8", + "RoxygenNote": "7.3.1", + "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]", + "Maintainer": "Carson Sievert ", + "Repository": "CRAN" }, "htmlwidgets": { "Package": "htmlwidgets", - "Version": "1.6.1", - "Source": "Repository", - "Repository": "RSPM", - "Hash": "b677ee5954471eaa974c0d099a343a1a", - "Requirements": [ - "htmltools", - "jsonlite", - "knitr", + "Version": "1.6.4", + "Source": "Repository", + "Type": "Package", + "Title": "HTML Widgets for R", + "Authors@R": "c( person(\"Ramnath\", \"Vaidyanathan\", role = c(\"aut\", \"cph\")), person(\"Yihui\", \"Xie\", role = \"aut\"), person(\"JJ\", \"Allaire\", role = \"aut\"), 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(\"Kenton\", \"Russell\", role = c(\"aut\", \"cph\")), person(\"Ellis\", \"Hughes\", role = \"ctb\"), person(\"Posit Software, PBC\", role = c(\"cph\", \"fnd\")) )", + "Description": "A framework for creating HTML widgets that render in various contexts including the R console, 'R Markdown' documents, and 'Shiny' web applications.", + "License": "MIT + file LICENSE", + "URL": "https://github.com/ramnathv/htmlwidgets", + "BugReports": "https://github.com/ramnathv/htmlwidgets/issues", + "Imports": [ + "grDevices", + "htmltools (>= 0.5.7)", + "jsonlite (>= 0.9.16)", + "knitr (>= 1.8)", "rmarkdown", "yaml" - ] - }, - "httpcode": { - "Package": "httpcode", - "Version": "0.3.0", - "Source": "Repository", - "Repository": "CRAN", - "Hash": "13641a1c6d2cc98801b76764078e17ea", - "Requirements": [] + ], + "Suggests": [ + "testthat" + ], + "Enhances": [ + "shiny (>= 1.1)" + ], + "VignetteBuilder": "knitr", + "Encoding": "UTF-8", + "RoxygenNote": "7.2.3", + "NeedsCompilation": "no", + "Author": "Ramnath Vaidyanathan [aut, cph], Yihui Xie [aut], JJ Allaire [aut], Joe Cheng [aut], Carson Sievert [aut, cre] (), Kenton Russell [aut, cph], Ellis Hughes [ctb], Posit Software, PBC [cph, fnd]", + "Maintainer": "Carson Sievert ", + "Repository": "RSPM" }, "httpuv": { "Package": "httpuv", - "Version": "1.6.9", - "Source": "Repository", - "Repository": "RSPM", - "Hash": "1046aa31a57eae8b357267a56a0b6d8b", - "Requirements": [ + "Version": "1.6.15", + "Source": "Repository", + "Type": "Package", + "Title": "HTTP and WebSocket Server Library", + "Authors@R": "c( person(\"Joe\", \"Cheng\", , \"joe@posit.co\", role = \"aut\"), person(\"Winston\", \"Chang\", , \"winston@posit.co\", role = c(\"aut\", \"cre\")), person(\"Posit, PBC\", \"fnd\", role = \"cph\"), person(\"Hector\", \"Corrada Bravo\", role = \"ctb\"), person(\"Jeroen\", \"Ooms\", role = \"ctb\"), person(\"Andrzej\", \"Krzemienski\", role = \"cph\", comment = \"optional.hpp\"), person(\"libuv project contributors\", role = \"cph\", comment = \"libuv library, see src/libuv/AUTHORS file\"), person(\"Joyent, Inc. and other Node contributors\", role = \"cph\", comment = \"libuv library, see src/libuv/AUTHORS file; and http-parser library, see src/http-parser/AUTHORS file\"), person(\"Niels\", \"Provos\", role = \"cph\", comment = \"libuv subcomponent: tree.h\"), person(\"Internet Systems Consortium, Inc.\", role = \"cph\", comment = \"libuv subcomponent: inet_pton and inet_ntop, contained in src/libuv/src/inet.c\"), person(\"Alexander\", \"Chemeris\", role = \"cph\", comment = \"libuv subcomponent: stdint-msvc2008.h (from msinttypes)\"), person(\"Google, Inc.\", role = \"cph\", comment = \"libuv subcomponent: pthread-fixes.c\"), person(\"Sony Mobile Communcations AB\", role = \"cph\", comment = \"libuv subcomponent: pthread-fixes.c\"), person(\"Berkeley Software Design Inc.\", role = \"cph\", comment = \"libuv subcomponent: android-ifaddrs.h, android-ifaddrs.c\"), person(\"Kenneth\", \"MacKay\", role = \"cph\", comment = \"libuv subcomponent: android-ifaddrs.h, android-ifaddrs.c\"), person(\"Emergya (Cloud4all, FP7/2007-2013, grant agreement no 289016)\", role = \"cph\", comment = \"libuv subcomponent: android-ifaddrs.h, android-ifaddrs.c\"), person(\"Steve\", \"Reid\", role = \"aut\", comment = \"SHA-1 implementation\"), person(\"James\", \"Brown\", role = \"aut\", comment = \"SHA-1 implementation\"), person(\"Bob\", \"Trower\", role = \"aut\", comment = \"base64 implementation\"), person(\"Alexander\", \"Peslyak\", role = \"aut\", comment = \"MD5 implementation\"), person(\"Trantor Standard Systems\", role = \"cph\", comment = \"base64 implementation\"), person(\"Igor\", \"Sysoev\", role = \"cph\", comment = \"http-parser\") )", + "Description": "Provides low-level socket and protocol support for handling HTTP and WebSocket requests directly from within R. It is primarily intended as a building block for other packages, rather than making it particularly easy to create complete web applications using httpuv alone. httpuv is built on top of the libuv and http-parser C libraries, both of which were developed by Joyent, Inc. (See LICENSE file for libuv and http-parser license information.)", + "License": "GPL (>= 2) | file LICENSE", + "URL": "https://github.com/rstudio/httpuv", + "BugReports": "https://github.com/rstudio/httpuv/issues", + "Depends": [ + "R (>= 2.15.1)" + ], + "Imports": [ + "later (>= 0.8.0)", + "promises", "R6", - "Rcpp", + "Rcpp (>= 1.0.7)", + "utils" + ], + "Suggests": [ + "callr", + "curl", + "testthat", + "websocket" + ], + "LinkingTo": [ "later", - "promises" - ] + "Rcpp" + ], + "Encoding": "UTF-8", + "RoxygenNote": "7.3.1", + "SystemRequirements": "GNU make, zlib", + "Collate": "'RcppExports.R' 'httpuv.R' 'random_port.R' 'server.R' 'staticServer.R' 'static_paths.R' 'utils.R'", + "NeedsCompilation": "yes", + "Author": "Joe Cheng [aut], Winston Chang [aut, cre], Posit, PBC fnd [cph], Hector Corrada Bravo [ctb], Jeroen Ooms [ctb], Andrzej Krzemienski [cph] (optional.hpp), libuv project contributors [cph] (libuv library, see src/libuv/AUTHORS file), Joyent, Inc. and other Node contributors [cph] (libuv library, see src/libuv/AUTHORS file; and http-parser library, see src/http-parser/AUTHORS file), Niels Provos [cph] (libuv subcomponent: tree.h), Internet Systems Consortium, Inc. [cph] (libuv subcomponent: inet_pton and inet_ntop, contained in src/libuv/src/inet.c), Alexander Chemeris [cph] (libuv subcomponent: stdint-msvc2008.h (from msinttypes)), Google, Inc. [cph] (libuv subcomponent: pthread-fixes.c), Sony Mobile Communcations AB [cph] (libuv subcomponent: pthread-fixes.c), Berkeley Software Design Inc. [cph] (libuv subcomponent: android-ifaddrs.h, android-ifaddrs.c), Kenneth MacKay [cph] (libuv subcomponent: android-ifaddrs.h, android-ifaddrs.c), Emergya (Cloud4all, FP7/2007-2013, grant agreement no 289016) [cph] (libuv subcomponent: android-ifaddrs.h, android-ifaddrs.c), Steve Reid [aut] (SHA-1 implementation), James Brown [aut] (SHA-1 implementation), Bob Trower [aut] (base64 implementation), Alexander Peslyak [aut] (MD5 implementation), Trantor Standard Systems [cph] (base64 implementation), Igor Sysoev [cph] (http-parser)", + "Maintainer": "Winston Chang ", + "Repository": "CRAN" }, "httr": { "Package": "httr", - "Version": "1.4.5", - "Source": "Repository", - "Repository": "RSPM", - "Hash": "f6844033201269bec3ca0097bc6c97b3", - "Requirements": [ - "R6", - "curl", + "Version": "1.4.7", + "Source": "Repository", + "Title": "Tools for Working with URLs and HTTP", + "Authors@R": "c( person(\"Hadley\", \"Wickham\", , \"hadley@posit.co\", role = c(\"aut\", \"cre\")), person(\"Posit, PBC\", role = c(\"cph\", \"fnd\")) )", + "Description": "Useful tools for working with HTTP organised by HTTP verbs (GET(), POST(), etc). Configuration functions make it easy to control additional request components (authenticate(), add_headers() and so on).", + "License": "MIT + file LICENSE", + "URL": "https://httr.r-lib.org/, https://github.com/r-lib/httr", + "BugReports": "https://github.com/r-lib/httr/issues", + "Depends": [ + "R (>= 3.5)" + ], + "Imports": [ + "curl (>= 5.0.2)", "jsonlite", "mime", - "openssl" - ] - }, - "httr2": { - "Package": "httr2", - "Version": "0.2.2", - "Source": "Repository", - "Repository": "RSPM", - "Hash": "5c09fe33064978ede54de42309c8b532", - "Requirements": [ - "R6", - "cli", - "curl", - "glue", - "magrittr", - "openssl", - "rappdirs", - "rlang", - "withr" - ] - }, - "hunspell": { - "Package": "hunspell", - "Version": "3.0.2", - "Source": "Repository", - "Repository": "CRAN", - "Hash": "656219b6f3f605499d7cdbe208656639", - "Requirements": [ - "Rcpp", - "digest" - ] - }, - "ini": { - "Package": "ini", - "Version": "0.3.1", - "Source": "Repository", - "Repository": "CRAN", - "Hash": "6154ec2223172bce8162d4153cda21f7", - "Requirements": [] + "openssl (>= 0.8)", + "R6" + ], + "Suggests": [ + "covr", + "httpuv", + "jpeg", + "knitr", + "png", + "readr", + "rmarkdown", + "testthat (>= 0.8.0)", + "xml2" + ], + "VignetteBuilder": "knitr", + "Config/Needs/website": "tidyverse/tidytemplate", + "Encoding": "UTF-8", + "RoxygenNote": "7.2.3", + "NeedsCompilation": "no", + "Author": "Hadley Wickham [aut, cre], Posit, PBC [cph, fnd]", + "Maintainer": "Hadley Wickham ", + "Repository": "RSPM" }, "insight": { "Package": "insight", - "Version": "0.19.0", + "Version": "1.2.0", "Source": "Repository", - "Repository": "RSPM", - "Hash": "494aea9b1ce585356ddff574c8c09e02", - "Requirements": [] + "Type": "Package", + "Title": "Easy Access to Model Information for Various Model Objects", + "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 = \"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 = \"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 = \"Vincent\", family = \"Arel-Bundock\", email = \"vincent.arel-bundock@umontreal.ca\", role = c(\"aut\", \"ctb\"), comment = c(ORCID = \"0000-0003-2042-7063\")), person(given = \"Etienne\", family = \"Bacher\", email = \"etienne.bacher@protonmail.com\", role = c(\"aut\", \"ctb\"), comment = c(ORCID = \"0000-0002-9271-5075\")), person(given = \"Alex\", family = \"Hayes\", role = c(\"rev\"), email = \"alexpghayes@gmail.com\", comment = c(ORCID = \"0000-0002-4985-5160\")), person(given = \"Grant\", family = \"McDermott\", role = c(\"ctb\"), email = \"grantmcd@uoregon.edu\", comment = c(ORCID = \"0000-0001-7883-8573\")), person(given = \"Rémi\", family = \"Thériault\", role = \"ctb\", email = \"remi.theriault@mail.mcgill.ca\", comment = c(ORCID = \"0000-0003-4315-6788\")), person(given = \"Alex\", family = \"Reinhart\", role = \"ctb\", email = \"areinhar@stat.cmu.edu\", comment = c(ORCID = \"0000-0002-6658-514X\")))", + "Maintainer": "Daniel Lüdecke ", + "Description": "A tool to provide an easy, intuitive and consistent access to information contained in various R models, like model formulas, model terms, information about random effects, data that was used to fit the model or data from response variables. 'insight' mainly revolves around two types of functions: Functions that find (the names of) information, starting with 'find_', and functions that get the underlying data, starting with 'get_'. The package has a consistent syntax and works with many different model objects, where otherwise functions to access these information are missing.", + "License": "GPL-3", + "URL": "https://easystats.github.io/insight/", + "BugReports": "https://github.com/easystats/insight/issues", + "Depends": [ + "R (>= 3.6)" + ], + "Imports": [ + "methods", + "stats", + "utils" + ], + "Suggests": [ + "AER", + "afex", + "aod", + "ape", + "BayesFactor", + "bayestestR", + "bbmle", + "bdsmatrix", + "betareg", + "bife", + "biglm", + "BH", + "blavaan (>= 0.5-5)", + "blme", + "boot", + "brms", + "broom", + "car", + "carData", + "censReg", + "cgam", + "clubSandwich", + "cobalt", + "coxme", + "cplm", + "crch", + "curl", + "datawizard", + "effectsize", + "emmeans", + "epiR", + "estimatr", + "feisr", + "fixest (>= 0.11.2)", + "fungible", + "fwb", + "gam", + "gamlss", + "gamlss.data", + "gamm4", + "gbm", + "gee", + "geepack", + "geoR", + "GLMMadaptive", + "glmmTMB (>= 1.1.10)", + "glmtoolbox", + "gmnl", + "grDevices", + "gt", + "httptest2", + "httr2", + "interp", + "ivreg", + "JM", + "knitr", + "lavaan", + "lavaSearch2", + "lfe", + "lme4", + "lmerTest", + "lmtest", + "logistf", + "logitr", + "marginaleffects (>= 0.25.0)", + "MASS", + "Matrix", + "mclogit", + "mclust", + "MCMCglmm", + "merTools", + "metaBMA", + "metadat", + "metafor", + "metaplus", + "mgcv", + "mice (>= 3.17.0)", + "mlogit", + "mmrm", + "modelbased (>= 0.9.0)", + "multgee", + "MuMIn", + "nestedLogit", + "nlme", + "nnet", + "nonnest2", + "ordinal", + "panelr", + "parameters", + "parsnip", + "pbkrtest", + "performance", + "phylolm", + "plm", + "poorman", + "PROreg (>= 1.3.0)", + "pscl", + "psych", + "quantreg", + "Rcpp", + "RcppEigen", + "rmarkdown", + "rms", + "robustbase", + "robustlmm", + "rpart", + "rstanarm (>= 2.21.1)", + "rstantools (>= 2.1.0)", + "rstudioapi", + "RWiener", + "sandwich", + "serp", + "speedglm", + "splines", + "statmod", + "survey", + "survival", + "svylme", + "testthat", + "tinytable (>= 0.8.0)", + "TMB", + "truncreg", + "tune", + "tweedie", + "VGAM", + "WeightIt", + "withr" + ], + "VignetteBuilder": "knitr", + "Encoding": "UTF-8", + "Language": "en-US", + "RoxygenNote": "7.3.2", + "Config/testthat/edition": "3", + "Config/testthat/parallel": "true", + "Config/Needs/website": "easystats/easystatstemplate", + "Config/Needs/check": "stan-dev/cmdstanr", + "NeedsCompilation": "no", + "Author": "Daniel Lüdecke [aut, cre] (), Dominique Makowski [aut, ctb] (), Indrajeet Patil [aut, ctb] (), Philip Waggoner [aut, ctb] (), Mattan S. Ben-Shachar [aut, ctb] (), Brenton M. Wiernik [aut, ctb] (), Vincent Arel-Bundock [aut, ctb] (), Etienne Bacher [aut, ctb] (), Alex Hayes [rev] (), Grant McDermott [ctb] (), Rémi Thériault [ctb] (), Alex Reinhart [ctb] ()", + "Repository": "CRAN" }, "isoband": { "Package": "isoband", "Version": "0.2.7", "Source": "Repository", - "Repository": "CRAN", - "Hash": "0080607b4a1a7b28979aecef976d8bc2", - "Requirements": [] + "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\")) )", + "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", + "BugReports": "https://github.com/r-lib/isoband/issues", + "Imports": [ + "grid", + "utils" + ], + "Suggests": [ + "covr", + "ggplot2", + "knitr", + "magick", + "microbenchmark", + "rmarkdown", + "sf", + "testthat", + "xml2" + ], + "VignetteBuilder": "knitr", + "Config/Needs/website": "tidyverse/tidytemplate", + "Config/testthat/edition": "3", + "Encoding": "UTF-8", + "RoxygenNote": "7.2.3", + "SystemRequirements": "C++11", + "NeedsCompilation": "yes", + "Author": "Hadley Wickham [aut, cre] (), Claus O. Wilke [aut] (Original author, ), Thomas Lin Pedersen [aut] ()", + "Maintainer": "Hadley Wickham ", + "Repository": "RSPM" }, "jquerylib": { "Package": "jquerylib", "Version": "0.1.4", "Source": "Repository", - "Repository": "CRAN", - "Hash": "5aab57a3bd297eee1c1d862735972182", - "Requirements": [ + "Title": "Obtain 'jQuery' as an HTML Dependency Object", + "Authors@R": "c( person(\"Carson\", \"Sievert\", role = c(\"aut\", \"cre\"), email = \"carson@rstudio.com\", comment = c(ORCID = \"0000-0002-4958-2844\")), person(\"Joe\", \"Cheng\", role = \"aut\", email = \"joe@rstudio.com\"), person(family = \"RStudio\", role = \"cph\"), 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/lib/jquery-AUTHORS.txt\") )", + "Description": "Obtain any major version of 'jQuery' () and use it in any webpage generated by 'htmltools' (e.g. 'shiny', 'htmlwidgets', and 'rmarkdown'). Most R users don't need to use this package directly, but other R packages (e.g. 'shiny', 'rmarkdown', etc.) depend on this package to avoid bundling redundant copies of 'jQuery'.", + "License": "MIT + file LICENSE", + "Encoding": "UTF-8", + "Config/testthat/edition": "3", + "RoxygenNote": "7.0.2", + "Imports": [ "htmltools" - ] + ], + "Suggests": [ + "testthat" + ], + "NeedsCompilation": "no", + "Author": "Carson Sievert [aut, cre] (), Joe Cheng [aut], RStudio [cph], jQuery Foundation [cph] (jQuery library and jQuery UI library), jQuery contributors [ctb, cph] (jQuery library; authors listed in inst/lib/jquery-AUTHORS.txt)", + "Maintainer": "Carson Sievert ", + "Repository": "CRAN" }, "jsonlite": { "Package": "jsonlite", - "Version": "1.8.4", - "Source": "Repository", - "Repository": "CRAN", - "Hash": "a4269a09a9b865579b2635c77e572374", - "Requirements": [] + "Version": "2.0.0", + "Source": "Repository", + "Title": "A Simple and Robust JSON Parser and Generator for R", + "License": "MIT + file LICENSE", + "Depends": [ + "methods" + ], + "Authors@R": "c( person(\"Jeroen\", \"Ooms\", role = c(\"aut\", \"cre\"), email = \"jeroenooms@gmail.com\", comment = c(ORCID = \"0000-0002-4035-0289\")), person(\"Duncan\", \"Temple Lang\", role = \"ctb\"), person(\"Lloyd\", \"Hilaiel\", role = \"cph\", comment=\"author of bundled libyajl\"))", + "URL": "https://jeroen.r-universe.dev/jsonlite https://arxiv.org/abs/1403.2805", + "BugReports": "https://github.com/jeroen/jsonlite/issues", + "Maintainer": "Jeroen Ooms ", + "VignetteBuilder": "knitr, R.rsp", + "Description": "A reasonably fast JSON parser and generator, optimized for statistical data and the web. Offers simple, flexible tools for working with JSON in R, and is particularly powerful for building pipelines and interacting with a web API. The implementation is based on the mapping described in the vignette (Ooms, 2014). In addition to converting JSON data from/to R objects, 'jsonlite' contains functions to stream, validate, and prettify JSON data. The unit tests included with the package verify that all edge cases are encoded and decoded consistently for use with dynamic data in systems and applications.", + "Suggests": [ + "httr", + "vctrs", + "testthat", + "knitr", + "rmarkdown", + "R.rsp", + "sf" + ], + "RoxygenNote": "7.3.2", + "Encoding": "UTF-8", + "NeedsCompilation": "yes", + "Author": "Jeroen Ooms [aut, cre] (), Duncan Temple Lang [ctb], Lloyd Hilaiel [cph] (author of bundled libyajl)", + "Repository": "RSPM" }, "juicyjuice": { "Package": "juicyjuice", "Version": "0.1.0", "Source": "Repository", - "Repository": "RSPM", - "Hash": "3bcd11943da509341838da9399e18bce", - "Requirements": [ - "V8" - ] + "Title": "Inline CSS Properties into HTML Tags Using 'juice'", + "Authors@R": "c( person(\"Richard\", \"Iannone\", , \"riannone@me.com\", c(\"aut\", \"cre\", \"cph\"), comment = c(ORCID = \"0000-0003-3925-190X\")), person(\"Automattic\", role = c(\"cph\"), comment = \"juice library\"), person(\"juice contributors\", role = c(\"ctb\"), comment = \"juice library\") )", + "Description": "There are occasions where you need a piece of HTML with integrated styles. A prime example of this is HTML email. This transformation involves moving the CSS and associated formatting instructions from the style block in the head of your document into the body of the HTML. Many prominent email clients require integrated styles in HTML email; otherwise a received HTML email will be displayed without any styling. This package will quickly and precisely perform these CSS transformations when given HTML text and it does so by using the JavaScript 'juice' library.", + "License": "MIT + file LICENSE", + "URL": "https://github.com/rich-iannone/juicyjuice", + "BugReports": "https://github.com/rich-iannone/juicyjuice/issues", + "Encoding": "UTF-8", + "RoxygenNote": "7.2.1", + "Imports": [ + "V8 (>= 4.2.0)" + ], + "Suggests": [ + "testthat (>= 3.0.0)" + ], + "Config/testthat/edition": "3", + "NeedsCompilation": "no", + "Author": "Richard Iannone [aut, cre, cph] (), Automattic [cph] (juice library), juice contributors [ctb] (juice library)", + "Maintainer": "Richard Iannone ", + "Repository": "CRAN" }, "knitr": { "Package": "knitr", - "Version": "1.42", - "Source": "Repository", - "Repository": "RSPM", - "Hash": "8329a9bcc82943c8069104d4be3ee22d", - "Requirements": [ - "evaluate", - "highr", - "xfun", - "yaml" - ] + "Version": "1.50", + "Source": "Repository", + "Type": "Package", + "Title": "A General-Purpose Package for Dynamic Report Generation in R", + "Authors@R": "c( person(\"Yihui\", \"Xie\", role = c(\"aut\", \"cre\"), email = \"xie@yihui.name\", comment = c(ORCID = \"0000-0003-0645-5666\", URL = \"https://yihui.org\")), person(\"Abhraneel\", \"Sarma\", role = \"ctb\"), person(\"Adam\", \"Vogt\", role = \"ctb\"), person(\"Alastair\", \"Andrew\", role = \"ctb\"), person(\"Alex\", \"Zvoleff\", role = \"ctb\"), person(\"Amar\", \"Al-Zubaidi\", role = \"ctb\"), person(\"Andre\", \"Simon\", role = \"ctb\", comment = \"the CSS files under inst/themes/ were derived from the Highlight package http://www.andre-simon.de\"), person(\"Aron\", \"Atkins\", role = \"ctb\"), person(\"Aaron\", \"Wolen\", role = \"ctb\"), person(\"Ashley\", \"Manton\", role = \"ctb\"), person(\"Atsushi\", \"Yasumoto\", role = \"ctb\", comment = c(ORCID = \"0000-0002-8335-495X\")), person(\"Ben\", \"Baumer\", role = \"ctb\"), person(\"Brian\", \"Diggs\", role = \"ctb\"), person(\"Brian\", \"Zhang\", role = \"ctb\"), person(\"Bulat\", \"Yapparov\", role = \"ctb\"), person(\"Cassio\", \"Pereira\", role = \"ctb\"), person(\"Christophe\", \"Dervieux\", role = \"ctb\"), person(\"David\", \"Hall\", role = \"ctb\"), person(\"David\", \"Hugh-Jones\", role = \"ctb\"), person(\"David\", \"Robinson\", role = \"ctb\"), person(\"Doug\", \"Hemken\", role = \"ctb\"), person(\"Duncan\", \"Murdoch\", role = \"ctb\"), person(\"Elio\", \"Campitelli\", role = \"ctb\"), person(\"Ellis\", \"Hughes\", role = \"ctb\"), person(\"Emily\", \"Riederer\", role = \"ctb\"), person(\"Fabian\", \"Hirschmann\", role = \"ctb\"), person(\"Fitch\", \"Simeon\", role = \"ctb\"), person(\"Forest\", \"Fang\", role = \"ctb\"), person(c(\"Frank\", \"E\", \"Harrell\", \"Jr\"), role = \"ctb\", comment = \"the Sweavel package at inst/misc/Sweavel.sty\"), person(\"Garrick\", \"Aden-Buie\", role = \"ctb\"), person(\"Gregoire\", \"Detrez\", role = \"ctb\"), person(\"Hadley\", \"Wickham\", role = \"ctb\"), person(\"Hao\", \"Zhu\", role = \"ctb\"), person(\"Heewon\", \"Jeon\", role = \"ctb\"), person(\"Henrik\", \"Bengtsson\", role = \"ctb\"), person(\"Hiroaki\", \"Yutani\", role = \"ctb\"), person(\"Ian\", \"Lyttle\", role = \"ctb\"), person(\"Hodges\", \"Daniel\", role = \"ctb\"), person(\"Jacob\", \"Bien\", role = \"ctb\"), person(\"Jake\", \"Burkhead\", role = \"ctb\"), person(\"James\", \"Manton\", role = \"ctb\"), person(\"Jared\", \"Lander\", role = \"ctb\"), person(\"Jason\", \"Punyon\", role = \"ctb\"), person(\"Javier\", \"Luraschi\", role = \"ctb\"), person(\"Jeff\", \"Arnold\", role = \"ctb\"), person(\"Jenny\", \"Bryan\", role = \"ctb\"), person(\"Jeremy\", \"Ashkenas\", role = c(\"ctb\", \"cph\"), comment = \"the CSS file at inst/misc/docco-classic.css\"), person(\"Jeremy\", \"Stephens\", role = \"ctb\"), person(\"Jim\", \"Hester\", role = \"ctb\"), person(\"Joe\", \"Cheng\", role = \"ctb\"), person(\"Johannes\", \"Ranke\", role = \"ctb\"), person(\"John\", \"Honaker\", role = \"ctb\"), person(\"John\", \"Muschelli\", role = \"ctb\"), person(\"Jonathan\", \"Keane\", role = \"ctb\"), person(\"JJ\", \"Allaire\", role = \"ctb\"), person(\"Johan\", \"Toloe\", role = \"ctb\"), person(\"Jonathan\", \"Sidi\", role = \"ctb\"), person(\"Joseph\", \"Larmarange\", role = \"ctb\"), person(\"Julien\", \"Barnier\", role = \"ctb\"), person(\"Kaiyin\", \"Zhong\", role = \"ctb\"), person(\"Kamil\", \"Slowikowski\", role = \"ctb\"), person(\"Karl\", \"Forner\", role = \"ctb\"), person(c(\"Kevin\", \"K.\"), \"Smith\", role = \"ctb\"), person(\"Kirill\", \"Mueller\", role = \"ctb\"), person(\"Kohske\", \"Takahashi\", role = \"ctb\"), person(\"Lorenz\", \"Walthert\", role = \"ctb\"), person(\"Lucas\", \"Gallindo\", role = \"ctb\"), person(\"Marius\", \"Hofert\", role = \"ctb\"), person(\"Martin\", \"Modrák\", role = \"ctb\"), person(\"Michael\", \"Chirico\", role = \"ctb\"), person(\"Michael\", \"Friendly\", role = \"ctb\"), person(\"Michal\", \"Bojanowski\", role = \"ctb\"), person(\"Michel\", \"Kuhlmann\", role = \"ctb\"), person(\"Miller\", \"Patrick\", role = \"ctb\"), person(\"Nacho\", \"Caballero\", role = \"ctb\"), person(\"Nick\", \"Salkowski\", role = \"ctb\"), person(\"Niels Richard\", \"Hansen\", role = \"ctb\"), person(\"Noam\", \"Ross\", role = \"ctb\"), person(\"Obada\", \"Mahdi\", role = \"ctb\"), person(\"Pavel N.\", \"Krivitsky\", role = \"ctb\", comment=c(ORCID = \"0000-0002-9101-3362\")), person(\"Pedro\", \"Faria\", role = \"ctb\"), person(\"Qiang\", \"Li\", role = \"ctb\"), person(\"Ramnath\", \"Vaidyanathan\", role = \"ctb\"), person(\"Richard\", \"Cotton\", role = \"ctb\"), person(\"Robert\", \"Krzyzanowski\", role = \"ctb\"), person(\"Rodrigo\", \"Copetti\", role = \"ctb\"), person(\"Romain\", \"Francois\", role = \"ctb\"), person(\"Ruaridh\", \"Williamson\", role = \"ctb\"), person(\"Sagiru\", \"Mati\", role = \"ctb\", comment = c(ORCID = \"0000-0003-1413-3974\")), person(\"Scott\", \"Kostyshak\", role = \"ctb\"), person(\"Sebastian\", \"Meyer\", role = \"ctb\"), person(\"Sietse\", \"Brouwer\", role = \"ctb\"), person(c(\"Simon\", \"de\"), \"Bernard\", role = \"ctb\"), person(\"Sylvain\", \"Rousseau\", role = \"ctb\"), person(\"Taiyun\", \"Wei\", role = \"ctb\"), person(\"Thibaut\", \"Assus\", role = \"ctb\"), person(\"Thibaut\", \"Lamadon\", role = \"ctb\"), person(\"Thomas\", \"Leeper\", role = \"ctb\"), person(\"Tim\", \"Mastny\", role = \"ctb\"), person(\"Tom\", \"Torsney-Weir\", role = \"ctb\"), person(\"Trevor\", \"Davis\", role = \"ctb\"), person(\"Viktoras\", \"Veitas\", role = \"ctb\"), person(\"Weicheng\", \"Zhu\", role = \"ctb\"), person(\"Wush\", \"Wu\", role = \"ctb\"), person(\"Zachary\", \"Foster\", role = \"ctb\"), person(\"Zhian N.\", \"Kamvar\", role = \"ctb\", comment = c(ORCID = \"0000-0003-1458-7108\")), person(given = \"Posit Software, PBC\", role = c(\"cph\", \"fnd\")) )", + "Description": "Provides a general-purpose tool for dynamic report generation in R using Literate Programming techniques.", + "Depends": [ + "R (>= 3.6.0)" + ], + "Imports": [ + "evaluate (>= 0.15)", + "highr (>= 0.11)", + "methods", + "tools", + "xfun (>= 0.51)", + "yaml (>= 2.1.19)" + ], + "Suggests": [ + "bslib", + "codetools", + "DBI (>= 0.4-1)", + "digest", + "formatR", + "gifski", + "gridSVG", + "htmlwidgets (>= 0.7)", + "jpeg", + "JuliaCall (>= 0.11.1)", + "magick", + "litedown", + "markdown (>= 1.3)", + "png", + "ragg", + "reticulate (>= 1.4)", + "rgl (>= 0.95.1201)", + "rlang", + "rmarkdown", + "sass", + "showtext", + "styler (>= 1.2.0)", + "targets (>= 0.6.0)", + "testit", + "tibble", + "tikzDevice (>= 0.10)", + "tinytex (>= 0.56)", + "webshot", + "rstudioapi", + "svglite" + ], + "License": "GPL", + "URL": "https://yihui.org/knitr/", + "BugReports": "https://github.com/yihui/knitr/issues", + "Encoding": "UTF-8", + "VignetteBuilder": "litedown, knitr", + "SystemRequirements": "Package vignettes based on R Markdown v2 or reStructuredText require Pandoc (http://pandoc.org). The function rst2pdf() requires rst2pdf (https://github.com/rst2pdf/rst2pdf).", + "Collate": "'block.R' 'cache.R' 'citation.R' 'hooks-html.R' 'plot.R' 'utils.R' 'defaults.R' 'concordance.R' 'engine.R' 'highlight.R' 'themes.R' 'header.R' 'hooks-asciidoc.R' 'hooks-chunk.R' 'hooks-extra.R' 'hooks-latex.R' 'hooks-md.R' 'hooks-rst.R' 'hooks-textile.R' 'hooks.R' 'output.R' 'package.R' 'pandoc.R' 'params.R' 'parser.R' 'pattern.R' 'rocco.R' 'spin.R' 'table.R' 'template.R' 'utils-conversion.R' 'utils-rd2html.R' 'utils-string.R' 'utils-sweave.R' 'utils-upload.R' 'utils-vignettes.R' 'zzz.R'", + "RoxygenNote": "7.3.2", + "NeedsCompilation": "no", + "Author": "Yihui Xie [aut, cre] (, https://yihui.org), Abhraneel Sarma [ctb], Adam Vogt [ctb], Alastair Andrew [ctb], Alex Zvoleff [ctb], Amar Al-Zubaidi [ctb], Andre Simon [ctb] (the CSS files under inst/themes/ were derived from the Highlight package http://www.andre-simon.de), Aron Atkins [ctb], Aaron Wolen [ctb], Ashley Manton [ctb], Atsushi Yasumoto [ctb] (), Ben Baumer [ctb], Brian Diggs [ctb], Brian Zhang [ctb], Bulat Yapparov [ctb], Cassio Pereira [ctb], Christophe Dervieux [ctb], David Hall [ctb], David Hugh-Jones [ctb], David Robinson [ctb], Doug Hemken [ctb], Duncan Murdoch [ctb], Elio Campitelli [ctb], Ellis Hughes [ctb], Emily Riederer [ctb], Fabian Hirschmann [ctb], Fitch Simeon [ctb], Forest Fang [ctb], Frank E Harrell Jr [ctb] (the Sweavel package at inst/misc/Sweavel.sty), Garrick Aden-Buie [ctb], Gregoire Detrez [ctb], Hadley Wickham [ctb], Hao Zhu [ctb], Heewon Jeon [ctb], Henrik Bengtsson [ctb], Hiroaki Yutani [ctb], Ian Lyttle [ctb], Hodges Daniel [ctb], Jacob Bien [ctb], Jake Burkhead [ctb], James Manton [ctb], Jared Lander [ctb], Jason Punyon [ctb], Javier Luraschi [ctb], Jeff Arnold [ctb], Jenny Bryan [ctb], Jeremy Ashkenas [ctb, cph] (the CSS file at inst/misc/docco-classic.css), Jeremy Stephens [ctb], Jim Hester [ctb], Joe Cheng [ctb], Johannes Ranke [ctb], John Honaker [ctb], John Muschelli [ctb], Jonathan Keane [ctb], JJ Allaire [ctb], Johan Toloe [ctb], Jonathan Sidi [ctb], Joseph Larmarange [ctb], Julien Barnier [ctb], Kaiyin Zhong [ctb], Kamil Slowikowski [ctb], Karl Forner [ctb], Kevin K. Smith [ctb], Kirill Mueller [ctb], Kohske Takahashi [ctb], Lorenz Walthert [ctb], Lucas Gallindo [ctb], Marius Hofert [ctb], Martin Modrák [ctb], Michael Chirico [ctb], Michael Friendly [ctb], Michal Bojanowski [ctb], Michel Kuhlmann [ctb], Miller Patrick [ctb], Nacho Caballero [ctb], Nick Salkowski [ctb], Niels Richard Hansen [ctb], Noam Ross [ctb], Obada Mahdi [ctb], Pavel N. Krivitsky [ctb] (), Pedro Faria [ctb], Qiang Li [ctb], Ramnath Vaidyanathan [ctb], Richard Cotton [ctb], Robert Krzyzanowski [ctb], Rodrigo Copetti [ctb], Romain Francois [ctb], Ruaridh Williamson [ctb], Sagiru Mati [ctb] (), Scott Kostyshak [ctb], Sebastian Meyer [ctb], Sietse Brouwer [ctb], Simon de Bernard [ctb], Sylvain Rousseau [ctb], Taiyun Wei [ctb], Thibaut Assus [ctb], Thibaut Lamadon [ctb], Thomas Leeper [ctb], Tim Mastny [ctb], Tom Torsney-Weir [ctb], Trevor Davis [ctb], Viktoras Veitas [ctb], Weicheng Zhu [ctb], Wush Wu [ctb], Zachary Foster [ctb], Zhian N. Kamvar [ctb] (), Posit Software, PBC [cph, fnd]", + "Maintainer": "Yihui Xie ", + "Repository": "RSPM" }, "labeling": { "Package": "labeling", - "Version": "0.4.2", + "Version": "0.4.3", "Source": "Repository", - "Repository": "CRAN", - "Hash": "3d5108641f47470611a32d0bdf357a72", - "Requirements": [] + "Type": "Package", + "Title": "Axis Labeling", + "Date": "2023-08-29", + "Author": "Justin Talbot,", + "Maintainer": "Nuno Sempere ", + "Description": "Functions which provide a range of axis labeling algorithms.", + "License": "MIT + file LICENSE | Unlimited", + "Collate": "'labeling.R'", + "NeedsCompilation": "no", + "Imports": [ + "stats", + "graphics" + ], + "Repository": "RSPM", + "Encoding": "UTF-8" + }, + "labelled": { + "Package": "labelled", + "Version": "2.14.1", + "Source": "Repository", + "Type": "Package", + "Title": "Manipulating Labelled Data", + "Maintainer": "Joseph Larmarange ", + "Authors@R": "c( person(\"Joseph\", \"Larmarange\", email = \"joseph@larmarange.net\", role = c(\"aut\", \"cre\"), comment = c(ORCID = \"0000-0001-7097-700X\")), person(\"Daniel\", \"Ludecke\", role = \"ctb\"), person(\"Hadley\", \"Wickham\", role = \"ctb\"), person(\"Michal\", \"Bojanowski\", role = \"ctb\"), person(\"François\", \"Briatte\", role = \"ctb\") )", + "Description": "Work with labelled data imported from 'SPSS' or 'Stata' with 'haven' or 'foreign'. This package provides useful functions to deal with \"haven_labelled\" and \"haven_labelled_spss\" classes introduced by 'haven' package.", + "License": "GPL (>= 3)", + "Encoding": "UTF-8", + "Depends": [ + "R (>= 3.2)" + ], + "Imports": [ + "haven (>= 2.4.1)", + "cli", + "dplyr (>= 1.1.0)", + "lifecycle", + "rlang (>= 1.1.0)", + "vctrs", + "stringr", + "tidyr", + "tidyselect" + ], + "Suggests": [ + "testthat (>= 3.2.0)", + "knitr", + "rmarkdown", + "questionr", + "snakecase", + "spelling" + ], + "Enhances": [ + "memisc" + ], + "URL": "https://larmarange.github.io/labelled/, https://github.com/larmarange/labelled", + "BugReports": "https://github.com/larmarange/labelled/issues", + "VignetteBuilder": "knitr", + "LazyData": "true", + "RoxygenNote": "7.3.2", + "Language": "en-US", + "Config/testthat/edition": "3", + "Config/Needs/check": "memisc", + "NeedsCompilation": "no", + "Author": "Joseph Larmarange [aut, cre] (ORCID: ), Daniel Ludecke [ctb], Hadley Wickham [ctb], Michal Bojanowski [ctb], François Briatte [ctb]", + "Repository": "CRAN" }, "later": { "Package": "later", - "Version": "1.3.0", + "Version": "1.4.2", "Source": "Repository", - "Repository": "CRAN", - "Hash": "7e7b457d7766bc47f2a5f21cc2984f8e", - "Requirements": [ - "Rcpp", + "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/\") )", + "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", + "Imports": [ + "Rcpp (>= 0.12.9)", "rlang" - ] + ], + "LinkingTo": [ + "Rcpp" + ], + "RoxygenNote": "7.3.2", + "Suggests": [ + "knitr", + "nanonext", + "R6", + "rmarkdown", + "testthat (>= 2.1.0)" + ], + "VignetteBuilder": "knitr", + "Encoding": "UTF-8", + "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 ", + "Repository": "RSPM" }, "lattice": { "Package": "lattice", - "Version": "0.20-45", - "Source": "Repository", + "Version": "0.22-7", + "Source": "Repository", + "Date": "2025-03-31", + "Priority": "recommended", + "Title": "Trellis Graphics for R", + "Authors@R": "c(person(\"Deepayan\", \"Sarkar\", role = c(\"aut\", \"cre\"), email = \"deepayan.sarkar@r-project.org\", comment = c(ORCID = \"0000-0003-4107-1553\")), person(\"Felix\", \"Andrews\", role = \"ctb\"), person(\"Kevin\", \"Wright\", role = \"ctb\", comment = \"documentation\"), person(\"Neil\", \"Klepeis\", role = \"ctb\"), person(\"Johan\", \"Larsson\", role = \"ctb\", comment = \"miscellaneous improvements\"), person(\"Zhijian (Jason)\", \"Wen\", role = \"cph\", comment = \"filled contour code\"), person(\"Paul\", \"Murrell\", role = \"ctb\", email = \"paul@stat.auckland.ac.nz\"), person(\"Stefan\", \"Eng\", role = \"ctb\", comment = \"violin plot improvements\"), person(\"Achim\", \"Zeileis\", role = \"ctb\", comment = \"modern colors\"), person(\"Alexandre\", \"Courtiol\", role = \"ctb\", comment = \"generics for larrows, lpolygon, lrect and lsegments\") )", + "Description": "A powerful and elegant high-level data visualization system inspired by Trellis graphics, with an emphasis on multivariate data. Lattice is sufficient for typical graphics needs, and is also flexible enough to handle most nonstandard requirements. See ?Lattice for an introduction.", + "Depends": [ + "R (>= 4.0.0)" + ], + "Suggests": [ + "KernSmooth", + "MASS", + "latticeExtra", + "colorspace" + ], + "Imports": [ + "grid", + "grDevices", + "graphics", + "stats", + "utils" + ], + "Enhances": [ + "chron", + "zoo" + ], + "LazyLoad": "yes", + "LazyData": "yes", + "License": "GPL (>= 2)", + "URL": "https://lattice.r-forge.r-project.org/", + "BugReports": "https://github.com/deepayan/lattice/issues", + "NeedsCompilation": "yes", + "Author": "Deepayan Sarkar [aut, cre] (), Felix Andrews [ctb], Kevin Wright [ctb] (documentation), Neil Klepeis [ctb], Johan Larsson [ctb] (miscellaneous improvements), Zhijian (Jason) Wen [cph] (filled contour code), Paul Murrell [ctb], Stefan Eng [ctb] (violin plot improvements), Achim Zeileis [ctb] (modern colors), Alexandre Courtiol [ctb] (generics for larrows, lpolygon, lrect and lsegments)", + "Maintainer": "Deepayan Sarkar ", "Repository": "CRAN", - "Hash": "b64cdbb2b340437c4ee047a1f4c4377b", - "Requirements": [] + "Encoding": "UTF-8" }, "lazyeval": { "Package": "lazyeval", "Version": "0.2.2", "Source": "Repository", - "Repository": "CRAN", - "Hash": "d908914ae53b04d4c0c0fd72ecc35370", - "Requirements": [] + "Title": "Lazy (Non-Standard) Evaluation", + "Description": "An alternative approach to non-standard evaluation using formulas. Provides a full implementation of LISP style 'quasiquotation', making it easier to generate code with other code.", + "Authors@R": "c( person(\"Hadley\", \"Wickham\", ,\"hadley@rstudio.com\", c(\"aut\", \"cre\")), person(\"RStudio\", role = \"cph\") )", + "License": "GPL-3", + "LazyData": "true", + "Depends": [ + "R (>= 3.1.0)" + ], + "Suggests": [ + "knitr", + "rmarkdown (>= 0.2.65)", + "testthat", + "covr" + ], + "VignetteBuilder": "knitr", + "RoxygenNote": "6.1.1", + "NeedsCompilation": "yes", + "Author": "Hadley Wickham [aut, cre], RStudio [cph]", + "Maintainer": "Hadley Wickham ", + "Repository": "RSPM", + "Encoding": "UTF-8" }, "lifecycle": { "Package": "lifecycle", - "Version": "1.0.3", + "Version": "1.0.4", "Source": "Repository", - "Repository": "CRAN", - "Hash": "001cecbeac1cff9301bdc3775ee46a86", - "Requirements": [ - "cli", + "Title": "Manage the Life Cycle of your Package Functions", + "Authors@R": "c( person(\"Lionel\", \"Henry\", , \"lionel@posit.co\", role = c(\"aut\", \"cre\")), person(\"Hadley\", \"Wickham\", , \"hadley@posit.co\", role = \"aut\", comment = c(ORCID = \"0000-0003-4757-117X\")), person(\"Posit Software, PBC\", role = c(\"cph\", \"fnd\")) )", + "Description": "Manage the life cycle of your exported functions with shared conventions, documentation badges, and user-friendly deprecation warnings.", + "License": "MIT + file LICENSE", + "URL": "https://lifecycle.r-lib.org/, https://github.com/r-lib/lifecycle", + "BugReports": "https://github.com/r-lib/lifecycle/issues", + "Depends": [ + "R (>= 3.6)" + ], + "Imports": [ + "cli (>= 3.4.0)", "glue", - "rlang" - ] - }, - "lubridate": { - "Package": "lubridate", - "Version": "1.9.2", - "Source": "Repository", - "Repository": "RSPM", - "Hash": "e25f18436e3efd42c7c590a1c4c15390", - "Requirements": [ - "generics", - "timechange" - ] + "rlang (>= 1.1.0)" + ], + "Suggests": [ + "covr", + "crayon", + "knitr", + "lintr", + "rmarkdown", + "testthat (>= 3.0.1)", + "tibble", + "tidyverse", + "tools", + "vctrs", + "withr" + ], + "VignetteBuilder": "knitr", + "Config/Needs/website": "tidyverse/tidytemplate, usethis", + "Config/testthat/edition": "3", + "Encoding": "UTF-8", + "RoxygenNote": "7.2.1", + "NeedsCompilation": "no", + "Author": "Lionel Henry [aut, cre], Hadley Wickham [aut] (), Posit Software, PBC [cph, fnd]", + "Maintainer": "Lionel Henry ", + "Repository": "CRAN" + }, + "litedown": { + "Package": "litedown", + "Version": "0.7", + "Source": "Repository", + "Type": "Package", + "Title": "A Lightweight Version of R Markdown", + "Authors@R": "c( person(\"Yihui\", \"Xie\", role = c(\"aut\", \"cre\"), email = \"xie@yihui.name\", comment = c(ORCID = \"0000-0003-0645-5666\", URL = \"https://yihui.org\")), person(\"Tim\", \"Taylor\", role = \"ctb\", comment = c(ORCID = \"0000-0002-8587-7113\")), person() )", + "Description": "Render R Markdown to Markdown (without using 'knitr'), and Markdown to lightweight HTML or 'LaTeX' documents with the 'commonmark' package (instead of 'Pandoc'). Some missing Markdown features in 'commonmark' are also supported, such as raw HTML or 'LaTeX' blocks, 'LaTeX' math, superscripts, subscripts, footnotes, element attributes, and appendices, but not all 'Pandoc' Markdown features are (or will be) supported. With additional JavaScript and CSS, you can also create HTML slides and articles. This package can be viewed as a trimmed-down version of R Markdown and 'knitr'. It does not aim at rich Markdown features or a large variety of output formats (the primary formats are HTML and 'LaTeX'). Book and website projects of multiple input documents are also supported.", + "Depends": [ + "R (>= 3.2.0)" + ], + "Imports": [ + "utils", + "commonmark (>= 1.9.5)", + "xfun (>= 0.52)" + ], + "Suggests": [ + "rbibutils", + "rstudioapi", + "tinytex" + ], + "License": "MIT + file LICENSE", + "URL": "https://github.com/yihui/litedown", + "BugReports": "https://github.com/yihui/litedown/issues", + "VignetteBuilder": "litedown", + "RoxygenNote": "7.3.2", + "Encoding": "UTF-8", + "NeedsCompilation": "no", + "Author": "Yihui Xie [aut, cre] (, https://yihui.org), Tim Taylor [ctb] ()", + "Maintainer": "Yihui Xie ", + "Repository": "CRAN" }, "magrittr": { "Package": "magrittr", "Version": "2.0.3", "Source": "Repository", - "Repository": "CRAN", - "Hash": "7ce2733a9826b3aeb1775d56fd305472", - "Requirements": [] + "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\")) )", + "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", + "BugReports": "https://github.com/tidyverse/magrittr/issues", + "Depends": [ + "R (>= 3.4.0)" + ], + "Suggests": [ + "covr", + "knitr", + "rlang", + "rmarkdown", + "testthat" + ], + "VignetteBuilder": "knitr", + "ByteCompile": "Yes", + "Config/Needs/website": "tidyverse/tidytemplate", + "Encoding": "UTF-8", + "RoxygenNote": "7.1.2", + "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 ", + "Repository": "CRAN" + }, + "markdown": { + "Package": "markdown", + "Version": "2.0", + "Source": "Repository", + "Type": "Package", + "Title": "Render Markdown with 'commonmark'", + "Authors@R": "c( person(\"Yihui\", \"Xie\", role = c(\"aut\", \"cre\"), email = \"xie@yihui.name\", comment = c(ORCID = \"0000-0003-0645-5666\")), person(\"JJ\", \"Allaire\", role = \"aut\"), person(\"Jeffrey\", \"Horner\", role = \"aut\"), person(\"Henrik\", \"Bengtsson\", role = \"ctb\"), person(\"Jim\", \"Hester\", role = \"ctb\"), person(\"Yixuan\", \"Qiu\", role = \"ctb\"), person(\"Kohske\", \"Takahashi\", role = \"ctb\"), person(\"Adam\", \"November\", role = \"ctb\"), person(\"Nacho\", \"Caballero\", role = \"ctb\"), person(\"Jeroen\", \"Ooms\", role = \"ctb\"), person(\"Thomas\", \"Leeper\", role = \"ctb\"), person(\"Joe\", \"Cheng\", role = \"ctb\"), person(\"Andrzej\", \"Oles\", role = \"ctb\"), person(given = \"Posit Software, PBC\", role = c(\"cph\", \"fnd\")) )", + "Description": "Render Markdown to full and lightweight HTML/LaTeX documents with the 'commonmark' package. This package has been superseded by 'litedown'.", + "Depends": [ + "R (>= 2.11.1)" + ], + "Imports": [ + "utils", + "xfun", + "litedown (>= 0.6)" + ], + "Suggests": [ + "knitr", + "rmarkdown (>= 2.18)", + "yaml", + "RCurl" + ], + "License": "MIT + file LICENSE", + "URL": "https://github.com/rstudio/markdown", + "BugReports": "https://github.com/rstudio/markdown/issues", + "RoxygenNote": "7.3.2", + "Encoding": "UTF-8", + "NeedsCompilation": "no", + "Author": "Yihui Xie [aut, cre] (), JJ Allaire [aut], Jeffrey Horner [aut], Henrik Bengtsson [ctb], Jim Hester [ctb], Yixuan Qiu [ctb], Kohske Takahashi [ctb], Adam November [ctb], Nacho Caballero [ctb], Jeroen Ooms [ctb], Thomas Leeper [ctb], Joe Cheng [ctb], Andrzej Oles [ctb], Posit Software, PBC [cph, fnd]", + "Maintainer": "Yihui Xie ", + "Repository": "CRAN" }, "memoise": { "Package": "memoise", "Version": "2.0.1", "Source": "Repository", - "Repository": "CRAN", - "Hash": "e2817ccf4a065c5d9d7f2cfbe7c1d78c", - "Requirements": [ - "cachem", - "rlang" - ] + "Title": "'Memoisation' of Functions", + "Authors@R": "c(person(given = \"Hadley\", family = \"Wickham\", role = \"aut\", email = \"hadley@rstudio.com\"), person(given = \"Jim\", family = \"Hester\", role = \"aut\"), person(given = \"Winston\", family = \"Chang\", role = c(\"aut\", \"cre\"), email = \"winston@rstudio.com\"), person(given = \"Kirill\", family = \"Müller\", role = \"aut\", email = \"krlmlr+r@mailbox.org\"), person(given = \"Daniel\", family = \"Cook\", role = \"aut\", email = \"danielecook@gmail.com\"), person(given = \"Mark\", family = \"Edmondson\", role = \"ctb\", email = \"r@sunholo.com\"))", + "Description": "Cache the results of a function so that when you call it again with the same arguments it returns the previously computed value.", + "License": "MIT + file LICENSE", + "URL": "https://memoise.r-lib.org, https://github.com/r-lib/memoise", + "BugReports": "https://github.com/r-lib/memoise/issues", + "Imports": [ + "rlang (>= 0.4.10)", + "cachem" + ], + "Suggests": [ + "digest", + "aws.s3", + "covr", + "googleAuthR", + "googleCloudStorageR", + "httr", + "testthat" + ], + "Encoding": "UTF-8", + "RoxygenNote": "7.1.2", + "NeedsCompilation": "no", + "Author": "Hadley Wickham [aut], Jim Hester [aut], Winston Chang [aut, cre], Kirill Müller [aut], Daniel Cook [aut], Mark Edmondson [ctb]", + "Maintainer": "Winston Chang ", + "Repository": "CRAN" }, "mgcv": { "Package": "mgcv", - "Version": "1.8-41", - "Source": "Repository", - "Repository": "RSPM", - "Hash": "6b3904f13346742caa3e82dd0303d4ad", - "Requirements": [ + "Version": "1.9-3", + "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.", + "Priority": "recommended", + "Depends": [ + "R (>= 3.6.0)", + "nlme (>= 3.1-64)" + ], + "Imports": [ + "methods", + "stats", + "graphics", "Matrix", - "nlme" - ] + "splines", + "utils" + ], + "Suggests": [ + "parallel", + "survival", + "MASS" + ], + "LazyLoad": "yes", + "ByteCompile": "yes", + "License": "GPL (>= 2)", + "NeedsCompilation": "yes", + "Author": "Simon Wood [aut, cre]", + "Maintainer": "Simon Wood ", + "Repository": "CRAN", + "Encoding": "UTF-8" }, "mime": { "Package": "mime", - "Version": "0.12", - "Source": "Repository", - "Repository": "CRAN", - "Hash": "18e9c28c1d3ca1560ce30658b22ce104", - "Requirements": [] - }, - "miniUI": { - "Package": "miniUI", - "Version": "0.1.1.1", - "Source": "Repository", - "Repository": "CRAN", - "Hash": "fec5f52652d60615fdb3957b3d74324a", - "Requirements": [ - "htmltools", - "shiny" - ] - }, - "munsell": { - "Package": "munsell", - "Version": "0.5.0", - "Source": "Repository", - "Repository": "CRAN", - "Hash": "6dfe8bf774944bd5595785e3229d8771", - "Requirements": [ - "colorspace" - ] + "Version": "0.13", + "Source": "Repository", + "Type": "Package", + "Title": "Map Filenames to MIME Types", + "Authors@R": "c( person(\"Yihui\", \"Xie\", role = c(\"aut\", \"cre\"), email = \"xie@yihui.name\", comment = c(ORCID = \"0000-0003-0645-5666\", URL = \"https://yihui.org\")), person(\"Jeffrey\", \"Horner\", role = \"ctb\"), person(\"Beilei\", \"Bian\", role = \"ctb\") )", + "Description": "Guesses the MIME type from a filename extension using the data derived from /etc/mime.types in UNIX-type systems.", + "Imports": [ + "tools" + ], + "License": "GPL", + "URL": "https://github.com/yihui/mime", + "BugReports": "https://github.com/yihui/mime/issues", + "RoxygenNote": "7.3.2", + "Encoding": "UTF-8", + "NeedsCompilation": "yes", + "Author": "Yihui Xie [aut, cre] (, https://yihui.org), Jeffrey Horner [ctb], Beilei Bian [ctb]", + "Maintainer": "Yihui Xie ", + "Repository": "RSPM" }, "nlme": { "Package": "nlme", - "Version": "3.1-162", - "Source": "Repository", - "Repository": "RSPM", - "Hash": "0984ce8da8da9ead8643c5cbbb60f83e", - "Requirements": [ + "Version": "3.1-168", + "Source": "Repository", + "Date": "2025-03-31", + "Priority": "recommended", + "Title": "Linear and Nonlinear Mixed Effects Models", + "Authors@R": "c(person(\"José\", \"Pinheiro\", role = \"aut\", comment = \"S version\"), person(\"Douglas\", \"Bates\", role = \"aut\", comment = \"up to 2007\"), person(\"Saikat\", \"DebRoy\", role = \"ctb\", comment = \"up to 2002\"), person(\"Deepayan\", \"Sarkar\", role = \"ctb\", comment = \"up to 2005\"), person(\"EISPACK authors\", role = \"ctb\", comment = \"src/rs.f\"), person(\"Siem\", \"Heisterkamp\", role = \"ctb\", comment = \"Author fixed sigma\"), person(\"Bert\", \"Van Willigen\",role = \"ctb\", comment = \"Programmer fixed sigma\"), person(\"Johannes\", \"Ranke\", role = \"ctb\", comment = \"varConstProp()\"), person(\"R Core Team\", email = \"R-core@R-project.org\", role = c(\"aut\", \"cre\"), comment = c(ROR = \"02zz1nj61\")))", + "Contact": "see 'MailingList'", + "Description": "Fit and compare Gaussian linear and nonlinear mixed-effects models.", + "Depends": [ + "R (>= 3.6.0)" + ], + "Imports": [ + "graphics", + "stats", + "utils", "lattice" - ] + ], + "Suggests": [ + "MASS", + "SASmixed" + ], + "LazyData": "yes", + "Encoding": "UTF-8", + "License": "GPL (>= 2)", + "BugReports": "https://bugs.r-project.org", + "MailingList": "R-help@r-project.org", + "URL": "https://svn.r-project.org/R-packages/trunk/nlme/", + "NeedsCompilation": "yes", + "Author": "José Pinheiro [aut] (S version), Douglas Bates [aut] (up to 2007), Saikat DebRoy [ctb] (up to 2002), Deepayan Sarkar [ctb] (up to 2005), EISPACK authors [ctb] (src/rs.f), Siem Heisterkamp [ctb] (Author fixed sigma), Bert Van Willigen [ctb] (Programmer fixed sigma), Johannes Ranke [ctb] (varConstProp()), R Core Team [aut, cre] (02zz1nj61)", + "Maintainer": "R Core Team ", + "Repository": "CRAN" }, "openssl": { "Package": "openssl", - "Version": "2.0.5", - "Source": "Repository", - "Repository": "CRAN", - "Hash": "b04c27110bf367b4daa93f34f3d58e75", - "Requirements": [ + "Version": "2.3.2", + "Source": "Repository", + "Type": "Package", + "Title": "Toolkit for Encryption, Signatures and Certificates Based on OpenSSL", + "Authors@R": "c(person(\"Jeroen\", \"Ooms\", role = c(\"aut\", \"cre\"), email = \"jeroenooms@gmail.com\", comment = c(ORCID = \"0000-0002-4035-0289\")), person(\"Oliver\", \"Keyes\", role = \"ctb\"))", + "Description": "Bindings to OpenSSL libssl and libcrypto, plus custom SSH key parsers. Supports RSA, DSA and EC curves P-256, P-384, P-521, and curve25519. Cryptographic signatures can either be created and verified manually or via x509 certificates. AES can be used in cbc, ctr or gcm mode for symmetric encryption; RSA for asymmetric (public key) encryption or EC for Diffie Hellman. High-level envelope functions combine RSA and AES for encrypting arbitrary sized data. Other utilities include key generators, hash functions (md5, sha1, sha256, etc), base64 encoder, a secure random number generator, and 'bignum' math methods for manually performing crypto calculations on large multibyte integers.", + "License": "MIT + file LICENSE", + "URL": "https://jeroen.r-universe.dev/openssl", + "BugReports": "https://github.com/jeroen/openssl/issues", + "SystemRequirements": "OpenSSL >= 1.0.2", + "VignetteBuilder": "knitr", + "Imports": [ "askpass" - ] - }, - "packrat": { - "Package": "packrat", - "Version": "0.9.1", - "Source": "Repository", - "Repository": "RSPM", - "Hash": "481428983c19a7c443f7ea1beff0a2de", - "Requirements": [] - }, - "pander": { - "Package": "pander", - "Version": "0.6.5", - "Source": "Repository", - "Repository": "CRAN", - "Hash": "737924139a1e4fc96356ff377c754c35", - "Requirements": [ - "Rcpp", - "digest" - ] - }, - "parsedate": { - "Package": "parsedate", - "Version": "1.3.1", + ], + "Suggests": [ + "curl", + "testthat (>= 2.1.0)", + "digest", + "knitr", + "rmarkdown", + "jsonlite", + "jose", + "sodium" + ], + "RoxygenNote": "7.3.2", + "Encoding": "UTF-8", + "NeedsCompilation": "yes", + "Author": "Jeroen Ooms [aut, cre] (), Oliver Keyes [ctb]", + "Maintainer": "Jeroen Ooms ", + "Repository": "RSPM" + }, + "patchwork": { + "Package": "patchwork", + "Version": "1.3.0", "Source": "Repository", - "Repository": "RSPM", - "Hash": "7f5024cc7af45eeecef657fa62beb568", - "Requirements": [] + "Type": "Package", + "Title": "The Composer of Plots", + "Authors@R": "person(given = \"Thomas Lin\", family = \"Pedersen\", role = c(\"cre\", \"aut\"), email = \"thomasp85@gmail.com\", comment = c(ORCID = \"0000-0002-5147-4711\"))", + "Maintainer": "Thomas Lin Pedersen ", + "Description": "The 'ggplot2' package provides a strong API for sequentially building up a plot, but does not concern itself with composition of multiple plots. 'patchwork' is a package that expands the API to allow for arbitrarily complex composition of plots by, among others, providing mathematical operators for combining multiple plots. Other packages that try to address this need (but with a different approach) are 'gridExtra' and 'cowplot'.", + "License": "MIT + file LICENSE", + "Encoding": "UTF-8", + "Imports": [ + "ggplot2 (>= 3.0.0)", + "gtable", + "grid", + "stats", + "grDevices", + "utils", + "graphics", + "rlang (>= 1.0.0)", + "cli", + "farver" + ], + "RoxygenNote": "7.3.2", + "URL": "https://patchwork.data-imaginist.com, https://github.com/thomasp85/patchwork", + "BugReports": "https://github.com/thomasp85/patchwork/issues", + "Suggests": [ + "knitr", + "rmarkdown", + "gridGraphics", + "gridExtra", + "ragg", + "testthat (>= 2.1.0)", + "vdiffr", + "covr", + "png", + "gt (>= 0.11.0)" + ], + "VignetteBuilder": "knitr", + "Config/Needs/website": "gifski", + "NeedsCompilation": "no", + "Author": "Thomas Lin Pedersen [cre, aut] ()", + "Repository": "RSPM" }, "pillar": { "Package": "pillar", - "Version": "1.8.1", - "Source": "Repository", - "Repository": "CRAN", - "Hash": "f2316df30902c81729ae9de95ad5a608", - "Requirements": [ - "cli", - "fansi", + "Version": "1.10.2", + "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\"))", + "Description": "Provides 'pillar' and 'colonnade' generics designed for formatting columns of data using the full range of colours provided by modern terminals.", + "License": "MIT + file LICENSE", + "URL": "https://pillar.r-lib.org/, https://github.com/r-lib/pillar", + "BugReports": "https://github.com/r-lib/pillar/issues", + "Imports": [ + "cli (>= 2.3.0)", "glue", "lifecycle", - "rlang", - "utf8", - "vctrs" - ] + "rlang (>= 1.0.2)", + "utf8 (>= 1.1.0)", + "utils", + "vctrs (>= 0.5.0)" + ], + "Suggests": [ + "bit64", + "DBI", + "debugme", + "DiagrammeR", + "dplyr", + "formattable", + "ggplot2", + "knitr", + "lubridate", + "nanotime", + "nycflights13", + "palmerpenguins", + "rmarkdown", + "scales", + "stringi", + "survival", + "testthat (>= 3.1.1)", + "tibble", + "units (>= 0.7.2)", + "vdiffr", + "withr" + ], + "VignetteBuilder": "knitr", + "Encoding": "UTF-8", + "RoxygenNote": "7.3.2.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", + "Config/autostyle/scope": "line_breaks", + "Config/autostyle/strict": "true", + "Config/gha/extra-packages": "units=?ignore-before-r=4.3.0", + "Config/Needs/website": "tidyverse/tidytemplate", + "NeedsCompilation": "no", + "Author": "Kirill Müller [aut, cre] (), Hadley Wickham [aut], RStudio [cph]", + "Maintainer": "Kirill Müller ", + "Repository": "RSPM" }, "pkgbuild": { "Package": "pkgbuild", - "Version": "1.4.0", - "Source": "Repository", - "Repository": "CRAN", - "Hash": "d6c3008d79653a0f267703288230105e", - "Requirements": [ - "R6", - "callr", - "cli", - "crayon", + "Version": "1.4.7", + "Source": "Repository", + "Title": "Find Tools Needed to Build R Packages", + "Authors@R": "c( person(\"Hadley\", \"Wickham\", role = \"aut\"), person(\"Jim\", \"Hester\", role = \"aut\"), person(\"Gábor\", \"Csárdi\", , \"csardi.gabor@gmail.com\", role = c(\"aut\", \"cre\")), person(\"Posit Software, PBC\", role = c(\"cph\", \"fnd\")) )", + "Description": "Provides functions used to build R packages. Locates compilers needed to build R packages on various platforms and ensures the PATH is configured appropriately so R can use them.", + "License": "MIT + file LICENSE", + "URL": "https://github.com/r-lib/pkgbuild, https://pkgbuild.r-lib.org", + "BugReports": "https://github.com/r-lib/pkgbuild/issues", + "Depends": [ + "R (>= 3.5)" + ], + "Imports": [ + "callr (>= 3.2.0)", + "cli (>= 3.4.0)", "desc", - "prettyunits", "processx", - "rprojroot", - "withr" - ] + "R6" + ], + "Suggests": [ + "covr", + "cpp11", + "knitr", + "Rcpp", + "rmarkdown", + "testthat (>= 3.2.0)", + "withr (>= 2.3.0)" + ], + "Config/Needs/website": "tidyverse/tidytemplate", + "Config/testthat/edition": "3", + "Encoding": "UTF-8", + "RoxygenNote": "7.3.2", + "NeedsCompilation": "no", + "Author": "Hadley Wickham [aut], Jim Hester [aut], Gábor Csárdi [aut, cre], Posit Software, PBC [cph, fnd]", + "Maintainer": "Gábor Csárdi ", + "Repository": "RSPM" }, "pkgconfig": { "Package": "pkgconfig", "Version": "2.0.3", "Source": "Repository", - "Repository": "CRAN", - "Hash": "01f28d4278f15c76cddbea05899c5d6f", - "Requirements": [] - }, - "pkgdown": { - "Package": "pkgdown", - "Version": "2.0.7", - "Source": "Repository", - "Repository": "CRAN", - "Hash": "16fa15449c930bf3a7761d3c68f8abf9", - "Requirements": [ - "bslib", - "callr", - "cli", - "desc", - "digest", - "downlit", - "fs", - "httr", - "jsonlite", - "magrittr", - "memoise", - "purrr", - "ragg", - "rlang", - "rmarkdown", - "tibble", - "whisker", - "withr", - "xml2", - "yaml" - ] + "Title": "Private Configuration for 'R' Packages", + "Author": "Gábor Csárdi", + "Maintainer": "Gábor Csárdi ", + "Description": "Set configuration options on a per-package basis. Options set by a given package only apply to that package, other packages are unaffected.", + "License": "MIT + file LICENSE", + "LazyData": "true", + "Imports": [ + "utils" + ], + "Suggests": [ + "covr", + "testthat", + "disposables (>= 1.0.3)" + ], + "URL": "https://github.com/r-lib/pkgconfig#readme", + "BugReports": "https://github.com/r-lib/pkgconfig/issues", + "Encoding": "UTF-8", + "NeedsCompilation": "no", + "Repository": "RSPM" }, "pkgload": { "Package": "pkgload", - "Version": "1.3.2", + "Version": "1.4.0", "Source": "Repository", - "Repository": "CRAN", - "Hash": "6b0c222c5071efe0f3baf3dae9aa40e2", - "Requirements": [ - "cli", - "crayon", + "Title": "Simulate Package Installation and Attach", + "Authors@R": "c( person(\"Hadley\", \"Wickham\", role = \"aut\"), person(\"Winston\", \"Chang\", role = \"aut\"), person(\"Jim\", \"Hester\", role = \"aut\"), person(\"Lionel\", \"Henry\", , \"lionel@posit.co\", role = c(\"aut\", \"cre\")), person(\"Posit Software, PBC\", role = c(\"cph\", \"fnd\")), person(\"R Core team\", role = \"ctb\", comment = \"Some namespace and vignette code extracted from base R\") )", + "Description": "Simulates the process of installing a package and then attaching it. This is a key part of the 'devtools' package as it allows you to rapidly iterate while developing a package.", + "License": "GPL-3", + "URL": "https://github.com/r-lib/pkgload, https://pkgload.r-lib.org", + "BugReports": "https://github.com/r-lib/pkgload/issues", + "Depends": [ + "R (>= 3.4.0)" + ], + "Imports": [ + "cli (>= 3.3.0)", "desc", "fs", "glue", - "rlang", + "lifecycle", + "methods", + "pkgbuild", + "processx", + "rlang (>= 1.1.1)", "rprojroot", - "withr" - ] + "utils", + "withr (>= 2.4.3)" + ], + "Suggests": [ + "bitops", + "jsonlite", + "mathjaxr", + "pak", + "Rcpp", + "remotes", + "rstudioapi", + "testthat (>= 3.2.1.1)", + "usethis" + ], + "Config/Needs/website": "tidyverse/tidytemplate, ggplot2", + "Config/testthat/edition": "3", + "Config/testthat/parallel": "TRUE", + "Config/testthat/start-first": "dll", + "Encoding": "UTF-8", + "RoxygenNote": "7.3.1", + "NeedsCompilation": "no", + "Author": "Hadley Wickham [aut], Winston Chang [aut], Jim Hester [aut], Lionel Henry [aut, cre], Posit Software, PBC [cph, fnd], R Core team [ctb] (Some namespace and vignette code extracted from base R)", + "Maintainer": "Lionel Henry ", + "Repository": "CRAN" }, "plotly": { "Package": "plotly", - "Version": "4.10.1", - "Source": "Repository", - "Repository": "CRAN", - "Hash": "3781cf6971c6467fa842a63725bbee9e", - "Requirements": [ - "RColorBrewer", - "base64enc", - "crosstalk", - "data.table", + "Version": "4.10.4", + "Source": "Repository", + "Title": "Create Interactive Web Graphics via 'plotly.js'", + "Authors@R": "c(person(\"Carson\", \"Sievert\", role = c(\"aut\", \"cre\"), email = \"cpsievert1@gmail.com\", comment = c(ORCID = \"0000-0002-4958-2844\")), person(\"Chris\", \"Parmer\", role = \"aut\", email = \"chris@plot.ly\"), person(\"Toby\", \"Hocking\", role = \"aut\", email = \"tdhock5@gmail.com\"), person(\"Scott\", \"Chamberlain\", role = \"aut\", email = \"myrmecocystus@gmail.com\"), person(\"Karthik\", \"Ram\", role = \"aut\", email = \"karthik.ram@gmail.com\"), person(\"Marianne\", \"Corvellec\", role = \"aut\", email = \"marianne.corvellec@igdore.org\", comment = c(ORCID = \"0000-0002-1994-3581\")), person(\"Pedro\", \"Despouy\", role = \"aut\", email = \"pedro@plot.ly\"), person(\"Salim\", \"Brüggemann\", role = \"ctb\", email = \"salim-b@pm.me\", comment = c(ORCID = \"0000-0002-5329-5987\")), person(\"Plotly Technologies Inc.\", role = \"cph\"))", + "License": "MIT + file LICENSE", + "Description": "Create interactive web graphics from 'ggplot2' graphs and/or a custom interface to the (MIT-licensed) JavaScript library 'plotly.js' inspired by the grammar of graphics.", + "URL": "https://plotly-r.com, https://github.com/plotly/plotly.R, https://plotly.com/r/", + "BugReports": "https://github.com/plotly/plotly.R/issues", + "Depends": [ + "R (>= 3.2.0)", + "ggplot2 (>= 3.0.0)" + ], + "Imports": [ + "tools", + "scales", + "httr (>= 1.3.0)", + "jsonlite (>= 1.6)", + "magrittr", "digest", + "viridisLite", + "base64enc", + "htmltools (>= 0.3.6)", + "htmlwidgets (>= 1.5.2.9001)", + "tidyr (>= 1.0.0)", + "RColorBrewer", "dplyr", - "ggplot2", - "htmltools", - "htmlwidgets", - "httr", - "jsonlite", - "lazyeval", - "magrittr", - "promises", - "purrr", - "rlang", - "scales", - "tibble", - "tidyr", "vctrs", - "viridisLite" - ] + "tibble", + "lazyeval (>= 0.2.0)", + "rlang (>= 0.4.10)", + "crosstalk", + "purrr", + "data.table", + "promises" + ], + "Suggests": [ + "MASS", + "maps", + "hexbin", + "ggthemes", + "GGally", + "ggalluvial", + "testthat", + "knitr", + "shiny (>= 1.1.0)", + "shinytest (>= 1.3.0)", + "curl", + "rmarkdown", + "Cairo", + "broom", + "webshot", + "listviewer", + "dendextend", + "sf", + "png", + "IRdisplay", + "processx", + "plotlyGeoAssets", + "forcats", + "withr", + "palmerpenguins", + "rversions", + "reticulate", + "rsvg" + ], + "LazyData": "true", + "RoxygenNote": "7.2.3", + "Encoding": "UTF-8", + "Config/Needs/check": "tidyverse/ggplot2, rcmdcheck, devtools, reshape2", + "NeedsCompilation": "no", + "Author": "Carson Sievert [aut, cre] (), Chris Parmer [aut], Toby Hocking [aut], Scott Chamberlain [aut], Karthik Ram [aut], Marianne Corvellec [aut] (), Pedro Despouy [aut], Salim Brüggemann [ctb] (), Plotly Technologies Inc. [cph]", + "Maintainer": "Carson Sievert ", + "Repository": "RSPM" }, "plyr": { "Package": "plyr", - "Version": "1.8.8", - "Source": "Repository", - "Repository": "RSPM", - "Hash": "d744387aef9047b0b48be2933d78e862", - "Requirements": [ + "Version": "1.8.9", + "Source": "Repository", + "Title": "Tools for Splitting, Applying and Combining Data", + "Authors@R": "person(\"Hadley\", \"Wickham\", , \"hadley@rstudio.com\", role = c(\"aut\", \"cre\"))", + "Description": "A set of tools that solves a common set of problems: you need to break a big problem down into manageable pieces, operate on each piece and then put all the pieces back together. For example, you might want to fit a model to each spatial location or time point in your study, summarise data by panels or collapse high-dimensional arrays to simpler summary statistics. The development of 'plyr' has been generously supported by 'Becton Dickinson'.", + "License": "MIT + file LICENSE", + "URL": "http://had.co.nz/plyr, https://github.com/hadley/plyr", + "BugReports": "https://github.com/hadley/plyr/issues", + "Depends": [ + "R (>= 3.1.0)" + ], + "Imports": [ + "Rcpp (>= 0.11.0)" + ], + "Suggests": [ + "abind", + "covr", + "doParallel", + "foreach", + "iterators", + "itertools", + "tcltk", + "testthat" + ], + "LinkingTo": [ "Rcpp" - ] - }, - "praise": { - "Package": "praise", - "Version": "1.0.0", - "Source": "Repository", - "Repository": "CRAN", - "Hash": "a555924add98c99d2f411e37e7d25e9f", - "Requirements": [] + ], + "Encoding": "UTF-8", + "LazyData": "true", + "RoxygenNote": "7.2.3", + "NeedsCompilation": "yes", + "Author": "Hadley Wickham [aut, cre]", + "Maintainer": "Hadley Wickham ", + "Repository": "CRAN" }, "prettyunits": { "Package": "prettyunits", - "Version": "1.1.1", + "Version": "1.2.0", "Source": "Repository", - "Repository": "CRAN", - "Hash": "95ef9167b75dde9d2ccc3c7528393e7e", - "Requirements": [] + "Title": "Pretty, Human Readable Formatting of Quantities", + "Authors@R": "c( person(\"Gabor\", \"Csardi\", email=\"csardi.gabor@gmail.com\", role=c(\"aut\", \"cre\")), person(\"Bill\", \"Denney\", email=\"wdenney@humanpredictions.com\", role=c(\"ctb\"), comment=c(ORCID=\"0000-0002-5759-428X\")), person(\"Christophe\", \"Regouby\", email=\"christophe.regouby@free.fr\", role=c(\"ctb\")) )", + "Description": "Pretty, human readable formatting of quantities. Time intervals: '1337000' -> '15d 11h 23m 20s'. Vague time intervals: '2674000' -> 'about a month ago'. Bytes: '1337' -> '1.34 kB'. Rounding: '99' with 3 significant digits -> '99.0' p-values: '0.00001' -> '<0.0001'. Colors: '#FF0000' -> 'red'. Quantities: '1239437' -> '1.24 M'.", + "License": "MIT + file LICENSE", + "URL": "https://github.com/r-lib/prettyunits", + "BugReports": "https://github.com/r-lib/prettyunits/issues", + "Depends": [ + "R(>= 2.10)" + ], + "Suggests": [ + "codetools", + "covr", + "testthat" + ], + "RoxygenNote": "7.2.3", + "Encoding": "UTF-8", + "NeedsCompilation": "no", + "Author": "Gabor Csardi [aut, cre], Bill Denney [ctb] (), Christophe Regouby [ctb]", + "Maintainer": "Gabor Csardi ", + "Repository": "RSPM" }, "processx": { "Package": "processx", - "Version": "3.8.0", - "Source": "Repository", - "Repository": "CRAN", - "Hash": "a33ee2d9bf07564efb888ad98410da84", - "Requirements": [ + "Version": "3.8.6", + "Source": "Repository", + "Title": "Execute and Control System Processes", + "Authors@R": "c( person(\"Gábor\", \"Csárdi\", , \"csardi.gabor@gmail.com\", role = c(\"aut\", \"cre\", \"cph\"), comment = c(ORCID = \"0000-0001-7098-9676\")), person(\"Winston\", \"Chang\", role = \"aut\"), person(\"Posit Software, PBC\", role = c(\"cph\", \"fnd\")), person(\"Ascent Digital Services\", role = c(\"cph\", \"fnd\")) )", + "Description": "Tools to run system processes in the background. It can check if a background process is running; wait on a background process to finish; get the exit status of finished processes; kill background processes. It can read the standard output and error of the processes, using non-blocking connections. 'processx' can poll a process for standard output or error, with a timeout. It can also poll several processes at once.", + "License": "MIT + file LICENSE", + "URL": "https://processx.r-lib.org, https://github.com/r-lib/processx", + "BugReports": "https://github.com/r-lib/processx/issues", + "Depends": [ + "R (>= 3.4.0)" + ], + "Imports": [ + "ps (>= 1.2.0)", "R6", - "ps" - ] - }, - "profvis": { - "Package": "profvis", - "Version": "0.3.7", - "Source": "Repository", - "Repository": "CRAN", - "Hash": "e9d21e79848e02e524bea6f5bd53e7e4", - "Requirements": [ - "htmlwidgets", - "stringr" - ] + "utils" + ], + "Suggests": [ + "callr (>= 3.7.3)", + "cli (>= 3.3.0)", + "codetools", + "covr", + "curl", + "debugme", + "parallel", + "rlang (>= 1.0.2)", + "testthat (>= 3.0.0)", + "webfakes", + "withr" + ], + "Config/Needs/website": "tidyverse/tidytemplate", + "Config/testthat/edition": "3", + "Encoding": "UTF-8", + "RoxygenNote": "7.3.1.9000", + "NeedsCompilation": "yes", + "Author": "Gábor Csárdi [aut, cre, cph] (), Winston Chang [aut], Posit Software, PBC [cph, fnd], Ascent Digital Services [cph, fnd]", + "Maintainer": "Gábor Csárdi ", + "Repository": "RSPM" }, "progress": { "Package": "progress", - "Version": "1.2.2", + "Version": "1.2.3", "Source": "Repository", - "Repository": "CRAN", - "Hash": "14dc9f7a3c91ebb14ec5bb9208a07061", - "Requirements": [ - "R6", + "Title": "Terminal Progress Bars", + "Authors@R": "c( person(\"Gábor\", \"Csárdi\", , \"csardi.gabor@gmail.com\", role = c(\"aut\", \"cre\")), person(\"Rich\", \"FitzJohn\", role = \"aut\"), person(\"Posit Software, PBC\", role = c(\"cph\", \"fnd\")) )", + "Description": "Configurable Progress bars, they may include percentage, elapsed time, and/or the estimated completion time. They work in terminals, in 'Emacs' 'ESS', 'RStudio', 'Windows' 'Rgui' and the 'macOS' 'R.app'. The package also provides a 'C++' 'API', that works with or without 'Rcpp'.", + "License": "MIT + file LICENSE", + "URL": "https://github.com/r-lib/progress#readme, http://r-lib.github.io/progress/", + "BugReports": "https://github.com/r-lib/progress/issues", + "Depends": [ + "R (>= 3.6)" + ], + "Imports": [ "crayon", "hms", - "prettyunits" - ] + "prettyunits", + "R6" + ], + "Suggests": [ + "Rcpp", + "testthat (>= 3.0.0)", + "withr" + ], + "Config/Needs/website": "tidyverse/tidytemplate", + "Config/testthat/edition": "3", + "Encoding": "UTF-8", + "RoxygenNote": "7.2.3", + "NeedsCompilation": "no", + "Author": "Gábor Csárdi [aut, cre], Rich FitzJohn [aut], Posit Software, PBC [cph, fnd]", + "Maintainer": "Gábor Csárdi ", + "Repository": "RSPM" }, "promises": { "Package": "promises", - "Version": "1.2.0.1", + "Version": "1.3.2", "Source": "Repository", - "Repository": "CRAN", - "Hash": "4ab2c43adb4d4699cf3690acd378d75d", - "Requirements": [ + "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\")) )", + "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", + "Imports": [ + "fastmap (>= 1.1.0)", + "later", + "magrittr (>= 1.5)", "R6", "Rcpp", + "rlang", + "stats" + ], + "Suggests": [ + "future (>= 1.21.0)", + "knitr", + "purrr", + "rmarkdown", + "spelling", + "testthat", + "vembedr" + ], + "LinkingTo": [ "later", - "magrittr", - "rlang" - ] + "Rcpp" + ], + "VignetteBuilder": "knitr", + "Config/Needs/website": "rsconnect", + "Encoding": "UTF-8", + "Language": "en-US", + "RoxygenNote": "7.3.2", + "NeedsCompilation": "yes", + "Author": "Joe Cheng [aut, cre], Posit Software, PBC [cph, fnd]", + "Maintainer": "Joe Cheng ", + "Repository": "CRAN" }, "ps": { "Package": "ps", - "Version": "1.7.2", - "Source": "Repository", - "Repository": "CRAN", - "Hash": "68dd03d98a5efd1eb3012436de45ba83", - "Requirements": [] + "Version": "1.9.1", + "Source": "Repository", + "Title": "List, Query, Manipulate System Processes", + "Authors@R": "c( person(\"Jay\", \"Loden\", role = \"aut\"), person(\"Dave\", \"Daeschler\", role = \"aut\"), person(\"Giampaolo\", \"Rodola'\", role = \"aut\"), person(\"Gábor\", \"Csárdi\", , \"csardi.gabor@gmail.com\", role = c(\"aut\", \"cre\")), person(\"Posit Software, PBC\", role = c(\"cph\", \"fnd\")) )", + "Description": "List, query and manipulate all system processes, on 'Windows', 'Linux' and 'macOS'.", + "License": "MIT + file LICENSE", + "URL": "https://github.com/r-lib/ps, https://ps.r-lib.org/", + "BugReports": "https://github.com/r-lib/ps/issues", + "Depends": [ + "R (>= 3.4)" + ], + "Imports": [ + "utils" + ], + "Suggests": [ + "callr", + "covr", + "curl", + "pillar", + "pingr", + "processx (>= 3.1.0)", + "R6", + "rlang", + "testthat (>= 3.0.0)", + "webfakes", + "withr" + ], + "Biarch": "true", + "Config/Needs/website": "tidyverse/tidytemplate", + "Config/testthat/edition": "3", + "Encoding": "UTF-8", + "RoxygenNote": "7.3.2", + "NeedsCompilation": "yes", + "Author": "Jay Loden [aut], Dave Daeschler [aut], Giampaolo Rodola' [aut], Gábor Csárdi [aut, cre], Posit Software, PBC [cph, fnd]", + "Maintainer": "Gábor Csárdi ", + "Repository": "RSPM" }, "purrr": { "Package": "purrr", - "Version": "1.0.1", - "Source": "Repository", - "Repository": "RSPM", - "Hash": "d71c815267c640f17ddbf7f16144b4bb", - "Requirements": [ - "cli", - "lifecycle", - "magrittr", - "rlang", - "vctrs" - ] - }, - "ragg": { - "Package": "ragg", - "Version": "1.2.5", + "Version": "1.0.4", "Source": "Repository", - "Repository": "RSPM", - "Hash": "690bc058ea2b1b8a407d3cfe3dce3ef9", - "Requirements": [ - "systemfonts", - "textshaping" - ] + "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 = \"03wc8by49\")) )", + "Description": "A complete and consistent functional programming toolkit for R.", + "License": "MIT + file LICENSE", + "URL": "https://purrr.tidyverse.org/, https://github.com/tidyverse/purrr", + "BugReports": "https://github.com/tidyverse/purrr/issues", + "Depends": [ + "R (>= 4.0)" + ], + "Imports": [ + "cli (>= 3.6.1)", + "lifecycle (>= 1.0.3)", + "magrittr (>= 1.5.0)", + "rlang (>= 1.1.1)", + "vctrs (>= 0.6.3)" + ], + "Suggests": [ + "covr", + "dplyr (>= 0.7.8)", + "httr", + "knitr", + "lubridate", + "rmarkdown", + "testthat (>= 3.0.0)", + "tibble", + "tidyselect" + ], + "LinkingTo": [ + "cli" + ], + "VignetteBuilder": "knitr", + "Biarch": "true", + "Config/build/compilation-database": "true", + "Config/Needs/website": "tidyverse/tidytemplate, tidyr", + "Config/testthat/edition": "3", + "Config/testthat/parallel": "TRUE", + "Encoding": "UTF-8", + "RoxygenNote": "7.3.2", + "NeedsCompilation": "yes", + "Author": "Hadley Wickham [aut, cre] (), Lionel Henry [aut], Posit Software, PBC [cph, fnd] (03wc8by49)", + "Maintainer": "Hadley Wickham ", + "Repository": "RSPM" }, "rappdirs": { "Package": "rappdirs", "Version": "0.3.3", "Source": "Repository", - "Repository": "CRAN", - "Hash": "5e3c5dc0b071b21fa128676560dbe94d", - "Requirements": [] - }, - "rcmdcheck": { - "Package": "rcmdcheck", - "Version": "1.4.0", - "Source": "Repository", - "Repository": "CRAN", - "Hash": "8f25ebe2ec38b1f2aef3b0d2ef76f6c4", - "Requirements": [ - "R6", - "callr", - "cli", - "curl", - "desc", + "Type": "Package", + "Title": "Application Directories: Determine Where to Save Data, Caches, and Logs", + "Authors@R": "c(person(given = \"Hadley\", family = \"Wickham\", role = c(\"trl\", \"cre\", \"cph\"), email = \"hadley@rstudio.com\"), person(given = \"RStudio\", role = \"cph\"), person(given = \"Sridhar\", family = \"Ratnakumar\", role = \"aut\"), person(given = \"Trent\", family = \"Mick\", role = \"aut\"), person(given = \"ActiveState\", role = \"cph\", comment = \"R/appdir.r, R/cache.r, R/data.r, R/log.r translated from appdirs\"), person(given = \"Eddy\", family = \"Petrisor\", role = \"ctb\"), person(given = \"Trevor\", family = \"Davis\", role = c(\"trl\", \"aut\")), person(given = \"Gabor\", family = \"Csardi\", role = \"ctb\"), person(given = \"Gregory\", family = \"Jefferis\", role = \"ctb\"))", + "Description": "An easy way to determine which directories on the users computer you should use to save data, caches and logs. A port of Python's 'Appdirs' () to R.", + "License": "MIT + file LICENSE", + "URL": "https://rappdirs.r-lib.org, https://github.com/r-lib/rappdirs", + "BugReports": "https://github.com/r-lib/rappdirs/issues", + "Depends": [ + "R (>= 3.2)" + ], + "Suggests": [ + "roxygen2", + "testthat (>= 3.0.0)", + "covr", + "withr" + ], + "Copyright": "Original python appdirs module copyright (c) 2010 ActiveState Software Inc. R port copyright Hadley Wickham, RStudio. See file LICENSE for details.", + "Encoding": "UTF-8", + "RoxygenNote": "7.1.1", + "Config/testthat/edition": "3", + "NeedsCompilation": "yes", + "Author": "Hadley Wickham [trl, cre, cph], RStudio [cph], Sridhar Ratnakumar [aut], Trent Mick [aut], ActiveState [cph] (R/appdir.r, R/cache.r, R/data.r, R/log.r translated from appdirs), Eddy Petrisor [ctb], Trevor Davis [trl, aut], Gabor Csardi [ctb], Gregory Jefferis [ctb]", + "Maintainer": "Hadley Wickham ", + "Repository": "CRAN" + }, + "reactR": { + "Package": "reactR", + "Version": "0.6.1", + "Source": "Repository", + "Type": "Package", + "Title": "React Helpers", + "Date": "2024-09-14", + "Authors@R": "c( person( \"Facebook\", \"Inc\" , role = c(\"aut\", \"cph\") , comment = \"React library in lib, https://reactjs.org/; see AUTHORS for full list of contributors\" ), person( \"Michel\",\"Weststrate\", , role = c(\"aut\", \"cph\") , comment = \"mobx library in lib, https://github.com/mobxjs\" ), person( \"Kent\", \"Russell\" , role = c(\"aut\", \"cre\") , comment = \"R interface\" , email = \"kent.russell@timelyportfolio.com\" ), person( \"Alan\", \"Dipert\" , role = c(\"aut\") , comment = \"R interface\" , email = \"alan@rstudio.com\" ), person( \"Greg\", \"Lin\" , role = c(\"aut\") , comment = \"R interface\" , email = \"glin@glin.io\" ) )", + "Maintainer": "Kent Russell ", + "Description": "Make it easy to use 'React' in R with 'htmlwidget' scaffolds, helper dependency functions, an embedded 'Babel' 'transpiler', and examples.", + "URL": "https://github.com/react-R/reactR", + "BugReports": "https://github.com/react-R/reactR/issues", + "License": "MIT + file LICENSE", + "Encoding": "UTF-8", + "Imports": [ + "htmltools" + ], + "Suggests": [ + "htmlwidgets (>= 1.5.3)", + "rmarkdown", + "shiny", + "V8", + "knitr", + "usethis", + "jsonlite" + ], + "RoxygenNote": "7.3.2", + "VignetteBuilder": "knitr", + "NeedsCompilation": "no", + "Author": "Facebook Inc [aut, cph] (React library in lib, https://reactjs.org/; see AUTHORS for full list of contributors), Michel Weststrate [aut, cph] (mobx library in lib, https://github.com/mobxjs), Kent Russell [aut, cre] (R interface), Alan Dipert [aut] (R interface), Greg Lin [aut] (R interface)", + "Repository": "RSPM" + }, + "reactable": { + "Package": "reactable", + "Version": "0.4.4", + "Source": "Repository", + "Type": "Package", + "Title": "Interactive Data Tables for R", + "Authors@R": "c( person(\"Greg\", \"Lin\", email = \"glin@glin.io\", role = c(\"aut\", \"cre\")), person(\"Tanner\", \"Linsley\", role = c(\"ctb\", \"cph\"), comment = \"React Table library\"), person(family = \"Emotion team and other contributors\", role = c(\"ctb\", \"cph\"), comment = \"Emotion library\"), person(\"Kent\", \"Russell\", role = c(\"ctb\", \"cph\"), comment = \"reactR package\"), person(\"Ramnath\", \"Vaidyanathan\", role = c(\"ctb\", \"cph\"), comment = \"htmlwidgets package\"), person(\"Joe\", \"Cheng\", role = c(\"ctb\", \"cph\"), comment = \"htmlwidgets package\"), person(\"JJ\", \"Allaire\", role = c(\"ctb\", \"cph\"), comment = \"htmlwidgets package\"), person(\"Yihui\", \"Xie\", role = c(\"ctb\", \"cph\"), comment = \"htmlwidgets package\"), person(\"Kenton\", \"Russell\", role = c(\"ctb\", \"cph\"), comment = \"htmlwidgets package\"), person(family = \"Facebook, Inc. and its affiliates\", role = c(\"ctb\", \"cph\"), comment = \"React library\"), person(family = \"FormatJS\", role = c(\"ctb\", \"cph\"), comment = \"FormatJS libraries\"), person(family = \"Feross Aboukhadijeh, and other contributors\", role = c(\"ctb\", \"cph\"), comment = \"buffer library\"), person(\"Roman\", \"Shtylman\", role = c(\"ctb\", \"cph\"), comment = \"process library\"), person(\"James\", \"Halliday\", role = c(\"ctb\", \"cph\"), comment = \"stream-browserify library\"), person(family = \"Posit Software, PBC\", role = c(\"fnd\", \"cph\")) )", + "Description": "Interactive data tables for R, based on the 'React Table' JavaScript library. Provides an HTML widget that can be used in 'R Markdown' or 'Quarto' documents, 'Shiny' applications, or viewed from an R console.", + "License": "MIT + file LICENSE", + "URL": "https://glin.github.io/reactable/, https://github.com/glin/reactable", + "BugReports": "https://github.com/glin/reactable/issues", + "Depends": [ + "R (>= 3.1)" + ], + "Imports": [ "digest", - "pkgbuild", - "prettyunits", - "rprojroot", - "sessioninfo", - "withr", - "xopen" - ] + "htmltools (>= 0.5.2)", + "htmlwidgets (>= 1.5.3)", + "jsonlite", + "reactR" + ], + "Suggests": [ + "covr", + "crosstalk", + "dplyr", + "fontawesome", + "knitr", + "leaflet", + "MASS", + "rmarkdown", + "shiny", + "sparkline", + "testthat", + "tippy", + "V8" + ], + "Encoding": "UTF-8", + "RoxygenNote": "7.2.1", + "Config/testthat/edition": "3", + "NeedsCompilation": "no", + "Author": "Greg Lin [aut, cre], Tanner Linsley [ctb, cph] (React Table library), Emotion team and other contributors [ctb, cph] (Emotion library), Kent Russell [ctb, cph] (reactR package), Ramnath Vaidyanathan [ctb, cph] (htmlwidgets package), Joe Cheng [ctb, cph] (htmlwidgets package), JJ Allaire [ctb, cph] (htmlwidgets package), Yihui Xie [ctb, cph] (htmlwidgets package), Kenton Russell [ctb, cph] (htmlwidgets package), Facebook, Inc. and its affiliates [ctb, cph] (React library), FormatJS [ctb, cph] (FormatJS libraries), Feross Aboukhadijeh, and other contributors [ctb, cph] (buffer library), Roman Shtylman [ctb, cph] (process library), James Halliday [ctb, cph] (stream-browserify library), Posit Software, PBC [fnd, cph]", + "Maintainer": "Greg Lin ", + "Repository": "RSPM" }, "readr": { "Package": "readr", - "Version": "2.1.4", - "Source": "Repository", - "Repository": "RSPM", - "Hash": "b5047343b3825f37ad9d3b5d89aa1078", - "Requirements": [ - "R6", - "cli", + "Version": "2.1.5", + "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\") )", + "Description": "The goal of 'readr' is to provide a fast and friendly way to read rectangular data (like 'csv', 'tsv', and 'fwf'). It is designed to flexibly parse many types of data found in the wild, while still cleanly failing when data unexpectedly changes.", + "License": "MIT + file LICENSE", + "URL": "https://readr.tidyverse.org, https://github.com/tidyverse/readr", + "BugReports": "https://github.com/tidyverse/readr/issues", + "Depends": [ + "R (>= 3.6)" + ], + "Imports": [ + "cli (>= 3.2.0)", "clipr", - "cpp11", "crayon", - "hms", - "lifecycle", + "hms (>= 0.4.1)", + "lifecycle (>= 0.2.0)", + "methods", + "R6", "rlang", "tibble", - "tzdb", - "vroom" - ] + "utils", + "vroom (>= 1.6.0)" + ], + "Suggests": [ + "covr", + "curl", + "datasets", + "knitr", + "rmarkdown", + "spelling", + "stringi", + "testthat (>= 3.2.0)", + "tzdb (>= 0.1.1)", + "waldo", + "withr", + "xml2" + ], + "LinkingTo": [ + "cpp11", + "tzdb (>= 0.1.1)" + ], + "VignetteBuilder": "knitr", + "Config/Needs/website": "tidyverse, tidyverse/tidytemplate", + "Config/testthat/edition": "3", + "Config/testthat/parallel": "false", + "Encoding": "UTF-8", + "Language": "en-US", + "RoxygenNote": "7.2.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)", + "Maintainer": "Jennifer Bryan ", + "Repository": "RSPM" + }, + "readxl": { + "Package": "readxl", + "Version": "1.4.5", + "Source": "Repository", + "Title": "Read Excel Files", + "Authors@R": "c( 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(\"Posit, PBC\", role = c(\"cph\", \"fnd\"), comment = \"Copyright holder of all R code and all C/C++ code without explicit copyright attribution\"), person(\"Marcin\", \"Kalicinski\", role = c(\"ctb\", \"cph\"), comment = \"Author of included RapidXML code\"), person(\"Komarov Valery\", role = c(\"ctb\", \"cph\"), comment = \"Author of included libxls code\"), person(\"Christophe Leitienne\", role = c(\"ctb\", \"cph\"), comment = \"Author of included libxls code\"), person(\"Bob Colbert\", role = c(\"ctb\", \"cph\"), comment = \"Author of included libxls code\"), person(\"David Hoerl\", role = c(\"ctb\", \"cph\"), comment = \"Author of included libxls code\"), person(\"Evan Miller\", role = c(\"ctb\", \"cph\"), comment = \"Author of included libxls code\") )", + "Description": "Import excel files into R. Supports '.xls' via the embedded 'libxls' C library and '.xlsx' via the embedded 'RapidXML' C++ library . Works on Windows, Mac and Linux without external dependencies.", + "License": "MIT + file LICENSE", + "URL": "https://readxl.tidyverse.org, https://github.com/tidyverse/readxl", + "BugReports": "https://github.com/tidyverse/readxl/issues", + "Depends": [ + "R (>= 3.6)" + ], + "Imports": [ + "cellranger", + "tibble (>= 2.0.1)", + "utils" + ], + "Suggests": [ + "covr", + "knitr", + "rmarkdown", + "testthat (>= 3.1.6)", + "withr" + ], + "LinkingTo": [ + "cpp11 (>= 0.4.0)", + "progress" + ], + "VignetteBuilder": "knitr", + "Config/Needs/website": "tidyverse/tidytemplate, tidyverse", + "Config/testthat/edition": "3", + "Encoding": "UTF-8", + "Note": "libxls v1.6.3 c199d13", + "RoxygenNote": "7.3.2", + "NeedsCompilation": "yes", + "Author": "Hadley Wickham [aut] (), Jennifer Bryan [aut, cre] (), Posit, PBC [cph, fnd] (Copyright holder of all R code and all C/C++ code without explicit copyright attribution), Marcin Kalicinski [ctb, cph] (Author of included RapidXML code), Komarov Valery [ctb, cph] (Author of included libxls code), Christophe Leitienne [ctb, cph] (Author of included libxls code), Bob Colbert [ctb, cph] (Author of included libxls code), David Hoerl [ctb, cph] (Author of included libxls code), Evan Miller [ctb, cph] (Author of included libxls code)", + "Maintainer": "Jennifer Bryan ", + "Repository": "CRAN" }, "rematch": { "Package": "rematch", - "Version": "1.0.1", - "Source": "Repository", - "Repository": "CRAN", - "Hash": "c66b930d20bb6d858cd18e1cebcfae5c", - "Requirements": [] - }, - "rematch2": { - "Package": "rematch2", - "Version": "2.1.2", - "Source": "Repository", - "Repository": "CRAN", - "Hash": "76c9e04c712a05848ae7a23d2f170a40", - "Requirements": [ - "tibble" - ] - }, - "remotes": { - "Package": "remotes", - "Version": "2.4.2", - "Source": "Repository", - "Repository": "CRAN", - "Hash": "227045be9aee47e6dda9bb38ac870d67", - "Requirements": [] + "Version": "2.0.0", + "Source": "Repository", + "Title": "Match Regular Expressions with a Nicer 'API'", + "Author": "Gabor Csardi", + "Maintainer": "Gabor Csardi ", + "Description": "A small wrapper on 'regexpr' to extract the matches and captured groups from the match of a regular expression to a character vector.", + "License": "MIT + file LICENSE", + "URL": "https://github.com/gaborcsardi/rematch", + "BugReports": "https://github.com/gaborcsardi/rematch/issues", + "RoxygenNote": "5.0.1.9000", + "Suggests": [ + "covr", + "testthat" + ], + "Encoding": "UTF-8", + "NeedsCompilation": "no", + "Repository": "CRAN" }, "renv": { "Package": "renv", - "Version": "0.16.0", - "Source": "Repository", - "Repository": "RSPM", - "Hash": "c9e8442ab69bc21c9697ecf856c1e6c7", - "Requirements": [] - }, - "reshape": { - "Package": "reshape", - "Version": "0.8.9", - "Source": "Repository", - "Repository": "CRAN", - "Hash": "603d56041d7d4fa3ceb1864b3f6ee6b1", - "Requirements": [ - "plyr" - ] + "Version": "1.1.4", + "Source": "Repository", + "Type": "Package", + "Title": "Project Environments", + "Authors@R": "c( person(\"Kevin\", \"Ushey\", role = c(\"aut\", \"cre\"), email = \"kevin@rstudio.com\", comment = c(ORCID = \"0000-0003-2880-7407\")), person(\"Hadley\", \"Wickham\", role = c(\"aut\"), email = \"hadley@rstudio.com\", comment = c(ORCID = \"0000-0003-4757-117X\")), person(\"Posit Software, PBC\", role = c(\"cph\", \"fnd\")) )", + "Description": "A dependency management toolkit for R. Using 'renv', you can create and manage project-local R libraries, save the state of these libraries to a 'lockfile', and later restore your library as required. Together, these tools can help make your projects more isolated, portable, and reproducible.", + "License": "MIT + file LICENSE", + "URL": "https://rstudio.github.io/renv/, https://github.com/rstudio/renv", + "BugReports": "https://github.com/rstudio/renv/issues", + "Imports": [ + "utils" + ], + "Suggests": [ + "BiocManager", + "cli", + "compiler", + "covr", + "cpp11", + "devtools", + "gitcreds", + "jsonlite", + "jsonvalidate", + "knitr", + "miniUI", + "modules", + "packrat", + "pak", + "R6", + "remotes", + "reticulate", + "rmarkdown", + "rstudioapi", + "shiny", + "testthat", + "uuid", + "waldo", + "yaml", + "webfakes" + ], + "Encoding": "UTF-8", + "RoxygenNote": "7.3.2", + "VignetteBuilder": "knitr", + "Config/Needs/website": "tidyverse/tidytemplate", + "Config/testthat/edition": "3", + "Config/testthat/parallel": "true", + "Config/testthat/start-first": "bioconductor,python,install,restore,snapshot,retrieve,remotes", + "NeedsCompilation": "no", + "Author": "Kevin Ushey [aut, cre] (), Hadley Wickham [aut] (), Posit Software, PBC [cph, fnd]", + "Maintainer": "Kevin Ushey ", + "Repository": "CRAN" }, "reshape2": { "Package": "reshape2", "Version": "1.4.4", "Source": "Repository", - "Repository": "CRAN", - "Hash": "bb5996d0bd962d214a11140d77589917", - "Requirements": [ + "Title": "Flexibly Reshape Data: A Reboot of the Reshape Package", + "Author": "Hadley Wickham ", + "Maintainer": "Hadley Wickham ", + "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", + "BugReports": "https://github.com/hadley/reshape/issues", + "Depends": [ + "R (>= 3.1)" + ], + "Imports": [ + "plyr (>= 1.8.1)", "Rcpp", - "plyr", "stringr" - ] - }, - "rex": { - "Package": "rex", - "Version": "1.2.1", - "Source": "Repository", - "Repository": "CRAN", - "Hash": "ae34cd56890607370665bee5bd17812f", - "Requirements": [ - "lazyeval" - ] + ], + "Suggests": [ + "covr", + "lattice", + "testthat (>= 0.8.0)" + ], + "LinkingTo": [ + "Rcpp" + ], + "Encoding": "UTF-8", + "LazyData": "true", + "RoxygenNote": "7.1.0", + "NeedsCompilation": "yes", + "Repository": "CRAN" }, - "rhub": { - "Package": "rhub", - "Version": "1.1.2", - "Source": "Repository", - "Repository": "CRAN", - "Hash": "e0880f6783f720d136755fb92d63c78b", - "Requirements": [ - "R6", - "assertthat", - "callr", - "cli", + "rlang": { + "Package": "rlang", + "Version": "1.1.5", + "Source": "Repository", + "Title": "Functions for Base Types and Core R and 'Tidyverse' Features", + "Description": "A toolbox for working with base types, core R features like the condition system, and core 'Tidyverse' features like tidy evaluation.", + "Authors@R": "c( person(\"Lionel\", \"Henry\", ,\"lionel@posit.co\", c(\"aut\", \"cre\")), person(\"Hadley\", \"Wickham\", ,\"hadley@posit.co\", \"aut\"), person(given = \"mikefc\", email = \"mikefc@coolbutuseless.com\", role = \"cph\", comment = \"Hash implementation based on Mike's xxhashlite\"), person(given = \"Yann\", family = \"Collet\", role = \"cph\", comment = \"Author of the embedded xxHash library\"), person(given = \"Posit, PBC\", role = c(\"cph\", \"fnd\")) )", + "License": "MIT + file LICENSE", + "ByteCompile": "true", + "Biarch": "true", + "Depends": [ + "R (>= 3.5.0)" + ], + "Imports": [ + "utils" + ], + "Suggests": [ + "cli (>= 3.1.0)", + "covr", "crayon", - "desc", - "digest", - "httr", - "jsonlite", - "parsedate", + "fs", + "glue", + "knitr", + "magrittr", + "methods", "pillar", - "prettyunits", - "processx", - "rappdirs", - "rcmdcheck", - "rematch", + "rmarkdown", + "stats", + "testthat (>= 3.0.0)", "tibble", - "uuid", - "whoami", + "usethis", + "vctrs (>= 0.2.3)", "withr" - ] - }, - "riskmetric": { - "Package": "riskmetric", - "Version": "0.2.0", - "Source": "Repository", - "Repository": "RSPM", - "Hash": "506b230db33d3d486b638e6e686c2e0d", - "Requirements": [ - "BiocManager", - "backports", - "covr", - "cranlogs", - "curl", - "devtools", - "httr", - "memoise", - "pillar", - "pkgload", - "tibble", - "urltools", - "vctrs", - "xml2" - ] - }, - "rlang": { - "Package": "rlang", - "Version": "1.0.6", - "Source": "Repository", - "Repository": "CRAN", - "Hash": "4ed1f8336c8d52c3e750adcdc57228a7", - "Requirements": [] + ], + "Enhances": [ + "winch" + ], + "Encoding": "UTF-8", + "RoxygenNote": "7.3.2", + "URL": "https://rlang.r-lib.org, https://github.com/r-lib/rlang", + "BugReports": "https://github.com/r-lib/rlang/issues", + "Config/testthat/edition": "3", + "Config/Needs/website": "dplyr, tidyverse/tidytemplate", + "NeedsCompilation": "yes", + "Author": "Lionel Henry [aut, cre], Hadley Wickham [aut], mikefc [cph] (Hash implementation based on Mike's xxhashlite), Yann Collet [cph] (Author of the embedded xxHash library), Posit, PBC [cph, fnd]", + "Maintainer": "Lionel Henry ", + "Repository": "CRAN" }, "rmarkdown": { "Package": "rmarkdown", - "Version": "2.20", - "Source": "Repository", - "Repository": "RSPM", - "Hash": "716fde5382293cc94a71f68c85b78d19", - "Requirements": [ - "bslib", - "evaluate", - "htmltools", + "Version": "2.29", + "Source": "Repository", + "Type": "Package", + "Title": "Dynamic Documents for R", + "Authors@R": "c( person(\"JJ\", \"Allaire\", , \"jj@posit.co\", role = \"aut\"), person(\"Yihui\", \"Xie\", , \"xie@yihui.name\", role = c(\"aut\", \"cre\"), comment = c(ORCID = \"0000-0003-0645-5666\")), person(\"Christophe\", \"Dervieux\", , \"cderv@posit.co\", role = \"aut\", comment = c(ORCID = \"0000-0003-4474-2498\")), person(\"Jonathan\", \"McPherson\", , \"jonathan@posit.co\", role = \"aut\"), person(\"Javier\", \"Luraschi\", role = \"aut\"), person(\"Kevin\", \"Ushey\", , \"kevin@posit.co\", role = \"aut\"), person(\"Aron\", \"Atkins\", , \"aron@posit.co\", role = \"aut\"), person(\"Hadley\", \"Wickham\", , \"hadley@posit.co\", role = \"aut\"), person(\"Joe\", \"Cheng\", , \"joe@posit.co\", role = \"aut\"), person(\"Winston\", \"Chang\", , \"winston@posit.co\", role = \"aut\"), person(\"Richard\", \"Iannone\", , \"rich@posit.co\", role = \"aut\", comment = c(ORCID = \"0000-0003-3925-190X\")), person(\"Andrew\", \"Dunning\", role = \"ctb\", comment = c(ORCID = \"0000-0003-0464-5036\")), person(\"Atsushi\", \"Yasumoto\", role = c(\"ctb\", \"cph\"), comment = c(ORCID = \"0000-0002-8335-495X\", cph = \"Number sections Lua filter\")), person(\"Barret\", \"Schloerke\", role = \"ctb\"), person(\"Carson\", \"Sievert\", role = \"ctb\", comment = c(ORCID = \"0000-0002-4958-2844\")), person(\"Devon\", \"Ryan\", , \"dpryan79@gmail.com\", role = \"ctb\", comment = c(ORCID = \"0000-0002-8549-0971\")), person(\"Frederik\", \"Aust\", , \"frederik.aust@uni-koeln.de\", role = \"ctb\", comment = c(ORCID = \"0000-0003-4900-788X\")), person(\"Jeff\", \"Allen\", , \"jeff@posit.co\", role = \"ctb\"), person(\"JooYoung\", \"Seo\", role = \"ctb\", comment = c(ORCID = \"0000-0002-4064-6012\")), person(\"Malcolm\", \"Barrett\", role = \"ctb\"), person(\"Rob\", \"Hyndman\", , \"Rob.Hyndman@monash.edu\", role = \"ctb\"), person(\"Romain\", \"Lesur\", role = \"ctb\"), person(\"Roy\", \"Storey\", role = \"ctb\"), person(\"Ruben\", \"Arslan\", , \"ruben.arslan@uni-goettingen.de\", role = \"ctb\"), person(\"Sergio\", \"Oller\", role = \"ctb\"), person(given = \"Posit Software, PBC\", role = c(\"cph\", \"fnd\")), person(, \"jQuery UI contributors\", role = c(\"ctb\", \"cph\"), comment = \"jQuery UI library; authors listed in inst/rmd/h/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(\"Alexander\", \"Farkas\", role = c(\"ctb\", \"cph\"), comment = \"html5shiv library\"), person(\"Scott\", \"Jehl\", role = c(\"ctb\", \"cph\"), comment = \"Respond.js library\"), person(\"Ivan\", \"Sagalaev\", role = c(\"ctb\", \"cph\"), comment = \"highlight.js library\"), person(\"Greg\", \"Franko\", role = c(\"ctb\", \"cph\"), comment = \"tocify library\"), person(\"John\", \"MacFarlane\", role = c(\"ctb\", \"cph\"), comment = \"Pandoc templates\"), person(, \"Google, Inc.\", role = c(\"ctb\", \"cph\"), comment = \"ioslides library\"), person(\"Dave\", \"Raggett\", role = \"ctb\", comment = \"slidy library\"), person(, \"W3C\", role = \"cph\", comment = \"slidy library\"), person(\"Dave\", \"Gandy\", role = c(\"ctb\", \"cph\"), comment = \"Font-Awesome\"), person(\"Ben\", \"Sperry\", role = \"ctb\", comment = \"Ionicons\"), person(, \"Drifty\", role = \"cph\", comment = \"Ionicons\"), person(\"Aidan\", \"Lister\", role = c(\"ctb\", \"cph\"), comment = \"jQuery StickyTabs\"), person(\"Benct Philip\", \"Jonsson\", role = c(\"ctb\", \"cph\"), comment = \"pagebreak Lua filter\"), person(\"Albert\", \"Krewinkel\", role = c(\"ctb\", \"cph\"), comment = \"pagebreak Lua filter\") )", + "Description": "Convert R Markdown documents into a variety of formats.", + "License": "GPL-3", + "URL": "https://github.com/rstudio/rmarkdown, https://pkgs.rstudio.com/rmarkdown/", + "BugReports": "https://github.com/rstudio/rmarkdown/issues", + "Depends": [ + "R (>= 3.0)" + ], + "Imports": [ + "bslib (>= 0.2.5.1)", + "evaluate (>= 0.13)", + "fontawesome (>= 0.5.0)", + "htmltools (>= 0.5.1)", "jquerylib", "jsonlite", - "knitr", - "stringr", - "tinytex", - "xfun", - "yaml" - ] - }, - "roxygen2": { - "Package": "roxygen2", - "Version": "7.2.3", - "Source": "Repository", - "Repository": "CRAN", - "Hash": "7b153c746193b143c14baa072bae4e27", - "Requirements": [ - "R6", - "brew", - "cli", - "commonmark", - "cpp11", - "desc", - "knitr", - "pkgload", - "purrr", - "rlang", - "stringi", - "stringr", - "withr", + "knitr (>= 1.43)", + "methods", + "tinytex (>= 0.31)", + "tools", + "utils", + "xfun (>= 0.36)", + "yaml (>= 2.1.19)" + ], + "Suggests": [ + "digest", + "dygraphs", + "fs", + "rsconnect", + "downlit (>= 0.4.0)", + "katex (>= 1.4.0)", + "sass (>= 0.4.0)", + "shiny (>= 1.6.0)", + "testthat (>= 3.0.3)", + "tibble", + "vctrs", + "cleanrmd", + "withr (>= 2.4.2)", "xml2" - ] + ], + "VignetteBuilder": "knitr", + "Config/Needs/website": "rstudio/quillt, pkgdown", + "Config/testthat/edition": "3", + "Encoding": "UTF-8", + "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)", + "Maintainer": "Yihui Xie ", + "Repository": "RSPM" }, "rprojroot": { "Package": "rprojroot", - "Version": "2.0.3", - "Source": "Repository", - "Repository": "CRAN", - "Hash": "1de7ab598047a87bba48434ba35d497d", - "Requirements": [] - }, - "rsconnect": { - "Package": "rsconnect", - "Version": "0.8.29", - "Source": "Repository", - "Repository": "CRAN", - "Hash": "fe178fc15af80952f546aafedf655b36", - "Requirements": [ - "curl", - "digest", - "jsonlite", - "openssl", - "packrat", - "rstudioapi", - "yaml" - ] - }, - "rstudioapi": { - "Package": "rstudioapi", - "Version": "0.14", - "Source": "Repository", - "Repository": "RSPM", - "Hash": "690bd2acc42a9166ce34845884459320", - "Requirements": [] - }, - "rversions": { - "Package": "rversions", - "Version": "2.1.2", - "Source": "Repository", - "Repository": "CRAN", - "Hash": "a9881dfed103e83f9de151dc17002cd1", - "Requirements": [ - "curl", - "xml2" - ] + "Version": "2.0.4", + "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\"))", + "Description": "Robust, reliable and flexible paths to files below a project root. The 'root' of a project is defined as a directory that matches a certain criterion, e.g., it contains a certain regular file.", + "License": "MIT + file LICENSE", + "URL": "https://rprojroot.r-lib.org/, https://github.com/r-lib/rprojroot", + "BugReports": "https://github.com/r-lib/rprojroot/issues", + "Depends": [ + "R (>= 3.0.0)" + ], + "Suggests": [ + "covr", + "knitr", + "lifecycle", + "mockr", + "rlang", + "rmarkdown", + "testthat (>= 3.0.0)", + "withr" + ], + "VignetteBuilder": "knitr", + "Config/testthat/edition": "3", + "Encoding": "UTF-8", + "RoxygenNote": "7.2.3", + "NeedsCompilation": "no", + "Author": "Kirill Müller [aut, cre] ()", + "Maintainer": "Kirill Müller ", + "Repository": "CRAN" }, "sass": { "Package": "sass", - "Version": "0.4.5", - "Source": "Repository", - "Repository": "RSPM", - "Hash": "2bb4371a4c80115518261866eab6ab11", - "Requirements": [ + "Version": "0.4.9", + "Source": "Repository", + "Type": "Package", + "Title": "Syntactically Awesome Style Sheets ('Sass')", + "Description": "An 'SCSS' compiler, powered by the 'LibSass' library. With this, R developers can use variables, inheritance, and functions to generate dynamic style sheets. The package uses the 'Sass CSS' extension language, which is stable, powerful, and CSS compatible.", + "Authors@R": "c( person(\"Joe\", \"Cheng\", , \"joe@rstudio.com\", \"aut\"), person(\"Timothy\", \"Mastny\", , \"tim.mastny@gmail.com\", \"aut\"), person(\"Richard\", \"Iannone\", , \"rich@rstudio.com\", \"aut\", comment = c(ORCID = \"0000-0003-3925-190X\")), person(\"Barret\", \"Schloerke\", , \"barret@rstudio.com\", \"aut\", comment = c(ORCID = \"0000-0001-9986-114X\")), person(\"Carson\", \"Sievert\", , \"carson@rstudio.com\", c(\"aut\", \"cre\"), comment = c(ORCID = \"0000-0002-4958-2844\")), person(\"Christophe\", \"Dervieux\", , \"cderv@rstudio.com\", c(\"ctb\"), comment = c(ORCID = \"0000-0003-4474-2498\")), person(family = \"RStudio\", role = c(\"cph\", \"fnd\")), person(family = \"Sass Open Source Foundation\", role = c(\"ctb\", \"cph\"), comment = \"LibSass library\"), person(\"Greter\", \"Marcel\", role = c(\"ctb\", \"cph\"), comment = \"LibSass library\"), person(\"Mifsud\", \"Michael\", role = c(\"ctb\", \"cph\"), comment = \"LibSass library\"), person(\"Hampton\", \"Catlin\", role = c(\"ctb\", \"cph\"), comment = \"LibSass library\"), person(\"Natalie\", \"Weizenbaum\", role = c(\"ctb\", \"cph\"), comment = \"LibSass library\"), person(\"Chris\", \"Eppstein\", role = c(\"ctb\", \"cph\"), comment = \"LibSass library\"), person(\"Adams\", \"Joseph\", role = c(\"ctb\", \"cph\"), comment = \"json.cpp\"), person(\"Trifunovic\", \"Nemanja\", role = c(\"ctb\", \"cph\"), comment = \"utf8.h\") )", + "License": "MIT + file LICENSE", + "URL": "https://rstudio.github.io/sass/, https://github.com/rstudio/sass", + "BugReports": "https://github.com/rstudio/sass/issues", + "Encoding": "UTF-8", + "RoxygenNote": "7.3.1", + "SystemRequirements": "GNU make", + "Imports": [ + "fs (>= 1.2.4)", + "rlang (>= 0.4.10)", + "htmltools (>= 0.5.1)", "R6", - "fs", - "htmltools", - "rappdirs", - "rlang" - ] + "rappdirs" + ], + "Suggests": [ + "testthat", + "knitr", + "rmarkdown", + "withr", + "shiny", + "curl" + ], + "VignetteBuilder": "knitr", + "Config/testthat/edition": "3", + "NeedsCompilation": "yes", + "Author": "Joe Cheng [aut], Timothy Mastny [aut], Richard Iannone [aut] (), Barret Schloerke [aut] (), Carson Sievert [aut, cre] (), Christophe Dervieux [ctb] (), RStudio [cph, fnd], Sass Open Source Foundation [ctb, cph] (LibSass library), Greter Marcel [ctb, cph] (LibSass library), Mifsud Michael [ctb, cph] (LibSass library), Hampton Catlin [ctb, cph] (LibSass library), Natalie Weizenbaum [ctb, cph] (LibSass library), Chris Eppstein [ctb, cph] (LibSass library), Adams Joseph [ctb, cph] (json.cpp), Trifunovic Nemanja [ctb, cph] (utf8.h)", + "Maintainer": "Carson Sievert ", + "Repository": "CRAN" }, "scales": { "Package": "scales", - "Version": "1.2.1", + "Version": "1.4.0", "Source": "Repository", - "Repository": "CRAN", - "Hash": "906cb23d2f1c5680b8ce439b44c6fa63", - "Requirements": [ - "R6", - "RColorBrewer", - "farver", + "Title": "Scale Functions for Visualization", + "Authors@R": "c( person(\"Hadley\", \"Wickham\", , \"hadley@posit.co\", role = \"aut\"), person(\"Thomas Lin\", \"Pedersen\", , \"thomas.pedersen@posit.co\", role = c(\"cre\", \"aut\"), comment = c(ORCID = \"0000-0002-5147-4711\")), person(\"Dana\", \"Seidel\", role = \"aut\"), person(\"Posit Software, PBC\", role = c(\"cph\", \"fnd\"), comment = c(ROR = \"03wc8by49\")) )", + "Description": "Graphical scales map data to aesthetics, and provide methods for automatically determining breaks and labels for axes and legends.", + "License": "MIT + file LICENSE", + "URL": "https://scales.r-lib.org, https://github.com/r-lib/scales", + "BugReports": "https://github.com/r-lib/scales/issues", + "Depends": [ + "R (>= 4.1)" + ], + "Imports": [ + "cli", + "farver (>= 2.0.3)", + "glue", "labeling", "lifecycle", - "munsell", - "rlang", + "R6", + "RColorBrewer", + "rlang (>= 1.1.0)", "viridisLite" - ] - }, - "sessioninfo": { - "Package": "sessioninfo", - "Version": "1.2.2", - "Source": "Repository", - "Repository": "CRAN", - "Hash": "3f9796a8d0a0e8c6eb49a4b029359d1f", - "Requirements": [ - "cli" - ] + ], + "Suggests": [ + "bit64", + "covr", + "dichromat", + "ggplot2", + "hms (>= 0.5.0)", + "stringi", + "testthat (>= 3.0.0)" + ], + "Config/Needs/website": "tidyverse/tidytemplate", + "Config/testthat/edition": "3", + "Config/usethis/last-upkeep": "2025-04-23", + "Encoding": "UTF-8", + "LazyLoad": "yes", + "RoxygenNote": "7.3.2", + "NeedsCompilation": "no", + "Author": "Hadley Wickham [aut], Thomas Lin Pedersen [cre, aut] (), Dana Seidel [aut], Posit Software, PBC [cph, fnd] (03wc8by49)", + "Maintainer": "Thomas Lin Pedersen ", + "Repository": "RSPM" }, "shiny": { "Package": "shiny", - "Version": "1.7.4", - "Source": "Repository", - "Repository": "CRAN", - "Hash": "c2eae3d8c670fa9dfa35a12066f4a1d5", - "Requirements": [ - "R6", - "bslib", - "cachem", - "commonmark", - "crayon", - "ellipsis", - "fastmap", - "fontawesome", - "glue", - "htmltools", - "httpuv", - "jsonlite", - "later", - "lifecycle", - "mime", - "promises", - "rlang", + "Version": "1.10.0", + "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(family = \"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", + "Depends": [ + "R (>= 3.0.2)", + "methods" + ], + "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", + "crayon", + "rlang (>= 0.4.10)", + "fastmap (>= 1.1.1)", "withr", - "xtable" - ] + "commonmark (>= 1.7)", + "glue (>= 1.3.2)", + "bslib (>= 0.6.0)", + "cachem (>= 1.1.0)", + "lifecycle (>= 0.2.0)" + ], + "Suggests": [ + "coro (>= 1.1.0)", + "datasets", + "DT", + "Cairo (>= 1.5-5)", + "testthat (>= 3.0.0)", + "knitr (>= 1.6)", + "markdown", + "rmarkdown", + "ggplot2", + "reactlog (>= 1.0.0)", + "magrittr", + "yaml", + "future", + "dygraphs", + "ragg", + "showtext", + "sass" + ], + "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", + "RdMacros": "lifecycle", + "Config/testthat/edition": "3", + "Config/Needs/check": "shinytest2", + "NeedsCompilation": "no", + "Author": "Winston Chang [aut, cre] (), Joe Cheng [aut], JJ Allaire [aut], Carson Sievert [aut] (), Barret Schloerke [aut] (), 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 ", + "Repository": "CRAN" }, "shinyTime": { "Package": "shinyTime", "Version": "1.0.3", "Source": "Repository", - "Repository": "RSPM", - "Hash": "836c3464fb0f2ea865ed4c35dcdc1eda", - "Requirements": [ + "Type": "Package", + "Title": "A Time Input Widget for Shiny", + "Authors@R": "person(\"Gerhard\", \"Burger\", email = \"burger.ga@gmail.com\", role = c(\"aut\", \"cre\"), comment = c(ORCID = \"0000-0003-1062-5576\"))", + "Description": "Provides a time input widget for Shiny. This widget allows intuitive time input in the '[hh]:[mm]:[ss]' or '[hh]:[mm]' (24H) format by using a separate numeric input for each time component. The interface with R uses date-time objects. See the project page for more information and examples.", + "License": "GPL-3 | file LICENSE", + "Imports": [ "htmltools", "shiny" - ] + ], + "URL": "https://burgerga.github.io/shinyTime/, https://github.com/burgerga/shinyTime", + "BugReports": "https://github.com/burgerga/shinyTime/issues", + "RoxygenNote": "7.2.1", + "Encoding": "UTF-8", + "Language": "en-US", + "Suggests": [ + "testthat (>= 2.1.0)", + "spelling", + "hms" + ], + "NeedsCompilation": "no", + "Author": "Gerhard Burger [aut, cre] ()", + "Maintainer": "Gerhard Burger ", + "Repository": "CRAN" }, "shinyWidgets": { "Package": "shinyWidgets", - "Version": "0.7.6", - "Source": "Repository", - "Repository": "RSPM", - "Hash": "fd889b32caa37b8ed9b1e9e7ef1564bc", - "Requirements": [ - "anytime", + "Version": "0.9.0", + "Source": "Repository", + "Title": "Custom Inputs Widgets for Shiny", + "Authors@R": "c( person(\"Victor\", \"Perrier\", email = \"victor.perrier@dreamrs.fr\", role = c(\"aut\", \"cre\", \"cph\")), person(\"Fanny\", \"Meyer\", role = \"aut\"), person(\"David\", \"Granjon\", role = \"aut\"), person(\"Ian\", \"Fellows\", role = \"ctb\", comment = \"Methods for mutating vertical tabs & updateMultiInput\"), person(\"Wil\", \"Davis\", role = \"ctb\", comment = \"numericRangeInput function\"), person(\"Spencer\", \"Matthews\", role = \"ctb\", comment = \"autoNumeric methods\"), person(family = \"JavaScript and CSS libraries authors\", role = c(\"ctb\", \"cph\"), comment = \"All authors are listed in LICENSE.md\") )", + "Description": "Collection of custom input controls and user interface components for 'Shiny' applications. Give your applications a unique and colorful style !", + "URL": "https://github.com/dreamRs/shinyWidgets, https://dreamrs.github.io/shinyWidgets/", + "BugReports": "https://github.com/dreamRs/shinyWidgets/issues", + "License": "GPL-3", + "Encoding": "UTF-8", + "LazyData": "true", + "RoxygenNote": "7.3.2", + "Depends": [ + "R (>= 3.1.0)" + ], + "Imports": [ "bslib", - "htmltools", - "jsonlite", - "rlang", "sass", - "shiny" - ] + "shiny (>= 1.6.0)", + "htmltools (>= 0.5.1)", + "jsonlite", + "grDevices", + "rlang" + ], + "Suggests": [ + "testthat", + "covr", + "ggplot2", + "DT", + "scales", + "shinydashboard", + "shinydashboardPlus" + ], + "NeedsCompilation": "no", + "Author": "Victor Perrier [aut, cre, cph], Fanny Meyer [aut], David Granjon [aut], Ian Fellows [ctb] (Methods for mutating vertical tabs & updateMultiInput), Wil Davis [ctb] (numericRangeInput function), Spencer Matthews [ctb] (autoNumeric methods), JavaScript and CSS libraries authors [ctb, cph] (All authors are listed in LICENSE.md)", + "Maintainer": "Victor Perrier ", + "Repository": "CRAN" }, "shinyjs": { "Package": "shinyjs", "Version": "2.1.0", "Source": "Repository", - "Repository": "CRAN", - "Hash": "802e4786b353a4bb27116957558548d5", - "Requirements": [ - "digest", + "Title": "Easily Improve the User Experience of Your Shiny Apps in Seconds", + "Authors@R": "person(\"Dean\", \"Attali\", email = \"daattali@gmail.com\", role = c(\"aut\", \"cre\"), comment= c(ORCID=\"0000-0002-5645-3493\"))", + "Description": "Perform common useful JavaScript operations in Shiny apps that will greatly improve your apps without having to know any JavaScript. Examples include: hiding an element, disabling an input, resetting an input back to its original value, delaying code execution by a few seconds, and many more useful functions for both the end user and the developer. 'shinyjs' can also be used to easily call your own custom JavaScript functions from R.", + "URL": "https://deanattali.com/shinyjs/", + "BugReports": "https://github.com/daattali/shinyjs/issues", + "Depends": [ + "R (>= 3.1.0)" + ], + "Imports": [ + "digest (>= 0.6.8)", "jsonlite", - "shiny" - ] + "shiny (>= 1.0.0)" + ], + "Suggests": [ + "htmltools (>= 0.2.9)", + "knitr (>= 1.7)", + "rmarkdown", + "shinyAce", + "shinydisconnect", + "testthat (>= 0.9.1)" + ], + "License": "MIT + file LICENSE", + "VignetteBuilder": "knitr", + "RoxygenNote": "7.1.1", + "Encoding": "UTF-8", + "NeedsCompilation": "no", + "Author": "Dean Attali [aut, cre] ()", + "Maintainer": "Dean Attali ", + "Repository": "CRAN" }, "sjlabelled": { "Package": "sjlabelled", "Version": "1.2.0", "Source": "Repository", - "Repository": "CRAN", - "Hash": "4bd18166ef8ca74aeec74ad295dfe77f", - "Requirements": [ + "Type": "Package", + "Encoding": "UTF-8", + "Title": "Labelled Data Utility Functions", + "Authors@R": "c( person(\"Daniel\", \"Lüdecke\", role = c(\"aut\", \"cre\"), email = \"d.luedecke@uke.de\", comment = c(ORCID = \"0000-0002-8895-3206\")), person(\"avid\", \"Ranzolin\", role = \"ctb\", email = \"daranzolin@gmail.com\"), person(\"Jonathan\", \"De Troye\", role = \"ctb\", email = \"detroyejr@outlook.com\") )", + "Maintainer": "Daniel Lüdecke ", + "Description": "Collection of functions dealing with labelled data, like reading and writing data between R and other statistical software packages like 'SPSS', 'SAS' or 'Stata', and working with labelled data. This includes easy ways to get, set or change value and variable label attributes, to convert labelled vectors into factors or numeric (and vice versa), or to deal with multiple declared missing values.", + "License": "GPL-3", + "Depends": [ + "R (>= 3.4)" + ], + "Imports": [ + "insight", "datawizard", - "insight" - ] + "stats", + "tools", + "utils" + ], + "Suggests": [ + "dplyr", + "haven (>= 1.1.2)", + "magrittr", + "sjmisc", + "sjPlot", + "knitr", + "rlang", + "rmarkdown", + "snakecase", + "testthat" + ], + "URL": "https://strengejacke.github.io/sjlabelled/", + "BugReports": "https://github.com/strengejacke/sjlabelled/issues", + "RoxygenNote": "7.1.2", + "VignetteBuilder": "knitr", + "NeedsCompilation": "no", + "Author": "Daniel Lüdecke [aut, cre] (), avid Ranzolin [ctb], Jonathan De Troye [ctb]", + "Repository": "CRAN" }, "sourcetools": { "Package": "sourcetools", "Version": "0.1.7-1", "Source": "Repository", - "Repository": "RSPM", - "Hash": "5f5a7629f956619d519205ec475fe647", - "Requirements": [] - }, - "spelling": { - "Package": "spelling", - "Version": "2.2", - "Source": "Repository", - "Repository": "CRAN", - "Hash": "b8c899a5c83f0d897286550481c91798", - "Requirements": [ - "commonmark", - "hunspell", - "knitr", - "xml2" - ] + "Type": "Package", + "Title": "Tools for Reading, Tokenizing and Parsing R Code", + "Author": "Kevin Ushey", + "Maintainer": "Kevin Ushey ", + "Description": "Tools for the reading and tokenization of R code. The 'sourcetools' package provides both an R and C++ interface for the tokenization of R code, and helpers for interacting with the tokenized representation of R code.", + "License": "MIT + file LICENSE", + "Depends": [ + "R (>= 3.0.2)" + ], + "Suggests": [ + "testthat" + ], + "RoxygenNote": "5.0.1", + "BugReports": "https://github.com/kevinushey/sourcetools/issues", + "Encoding": "UTF-8", + "NeedsCompilation": "yes", + "Repository": "CRAN" + }, + "stringdist": { + "Package": "stringdist", + "Version": "0.9.17", + "Source": "Repository", + "Maintainer": "Mark van der Loo ", + "License": "GPL-3", + "Title": "Approximate String Matching, Fuzzy Text Search, and String Distance Functions", + "Type": "Package", + "LazyLoad": "yes", + "Authors@R": "c( person(\"Mark\", \"van der Loo\", role=c(\"aut\",\"cre\") , email=\"mark.vanderloo@gmail.com\" , comment= c(ORCID=\"0000-0002-9807-4686\")) , person(\"Jan\", \"van der Laan\", role=\"ctb\") , person(\"R Core Team\",\"\" , role=\"ctb\") , person(\"Nick\",\"Logan\" , role=\"ctb\") , person(\"Chris\",\"Muir\" , role=\"ctb\") , person(\"Johannes\", \"Gruber\" , role=\"ctb\") , person(\"Brian\",\"Ripley\" , role=\"ctb\"))", + "Description": "Implements an approximate string matching version of R's native 'match' function. Also offers fuzzy text search based on various string distance measures. Can calculate various string distances based on edits (Damerau-Levenshtein, Hamming, Levenshtein, optimal sting alignment), qgrams (q- gram, cosine, jaccard distance) or heuristic metrics (Jaro, Jaro-Winkler). An implementation of soundex is provided as well. Distances can be computed between character vectors while taking proper care of encoding or between integer vectors representing generic sequences. This package is built for speed and runs in parallel by using 'openMP'. An API for C or C++ is exposed as well. Reference: MPJ van der Loo (2014) .", + "Depends": [ + "R (>= 2.15.3)" + ], + "URL": "https://github.com/markvanderloo/stringdist", + "BugReports": "https://github.com/markvanderloo/stringdist/issues", + "Suggests": [ + "tinytest" + ], + "Imports": [ + "parallel" + ], + "Encoding": "UTF-8", + "RoxygenNote": "7.3.2", + "NeedsCompilation": "yes", + "Author": "Mark van der Loo [aut, cre] (ORCID: ), Jan van der Laan [ctb], R Core Team [ctb], Nick Logan [ctb], Chris Muir [ctb], Johannes Gruber [ctb], Brian Ripley [ctb]", + "Repository": "RSPM" }, "stringi": { "Package": "stringi", - "Version": "1.7.12", - "Source": "Repository", - "Repository": "RSPM", - "Hash": "ca8bd84263c77310739d2cf64d84d7c9", - "Requirements": [] + "Version": "1.8.7", + "Source": "Repository", + "Date": "2025-03-27", + "Title": "Fast and Portable Character String Processing Facilities", + "Description": "A collection of character string/text/natural language processing tools for pattern searching (e.g., with 'Java'-like regular expressions or the 'Unicode' collation algorithm), random string generation, case mapping, string transliteration, concatenation, sorting, padding, wrapping, Unicode normalisation, date-time formatting and parsing, and many more. They are fast, consistent, convenient, and - thanks to 'ICU' (International Components for Unicode) - portable across all locales and platforms. Documentation about 'stringi' is provided via its website at and the paper by Gagolewski (2022, ).", + "URL": "https://stringi.gagolewski.com/, https://github.com/gagolews/stringi, https://icu.unicode.org/", + "BugReports": "https://github.com/gagolews/stringi/issues", + "SystemRequirements": "ICU4C (>= 61, optional)", + "Type": "Package", + "Depends": [ + "R (>= 3.4)" + ], + "Imports": [ + "tools", + "utils", + "stats" + ], + "Biarch": "TRUE", + "License": "file LICENSE", + "Authors@R": "c(person(given = \"Marek\", family = \"Gagolewski\", role = c(\"aut\", \"cre\", \"cph\"), email = \"marek@gagolewski.com\", comment = c(ORCID = \"0000-0003-0637-6028\")), person(given = \"Bartek\", family = \"Tartanus\", role = \"ctb\"), person(\"Unicode, Inc. and others\", role=\"ctb\", comment = \"ICU4C source code, Unicode Character Database\") )", + "RoxygenNote": "7.3.2", + "Encoding": "UTF-8", + "NeedsCompilation": "yes", + "Author": "Marek Gagolewski [aut, cre, cph] (), Bartek Tartanus [ctb], Unicode, Inc. and others [ctb] (ICU4C source code, Unicode Character Database)", + "Maintainer": "Marek Gagolewski ", + "License_is_FOSS": "yes", + "Repository": "RSPM" }, "stringr": { "Package": "stringr", - "Version": "1.5.0", + "Version": "1.5.1", "Source": "Repository", - "Repository": "CRAN", - "Hash": "671a4d384ae9d32fc47a14e98bfa3dc8", - "Requirements": [ + "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\")) )", + "Description": "A consistent, simple and easy to use set of wrappers around the fantastic 'stringi' package. All function and argument names (and positions) are consistent, all functions deal with \"NA\"'s and zero length vectors in the same way, and the output from one function is easy to feed into the input of another.", + "License": "MIT + file LICENSE", + "URL": "https://stringr.tidyverse.org, https://github.com/tidyverse/stringr", + "BugReports": "https://github.com/tidyverse/stringr/issues", + "Depends": [ + "R (>= 3.6)" + ], + "Imports": [ "cli", - "glue", - "lifecycle", + "glue (>= 1.6.1)", + "lifecycle (>= 1.0.3)", "magrittr", - "rlang", - "stringi", - "vctrs" - ] + "rlang (>= 1.0.0)", + "stringi (>= 1.5.3)", + "vctrs (>= 0.4.0)" + ], + "Suggests": [ + "covr", + "dplyr", + "gt", + "htmltools", + "htmlwidgets", + "knitr", + "rmarkdown", + "testthat (>= 3.0.0)", + "tibble" + ], + "VignetteBuilder": "knitr", + "Config/Needs/website": "tidyverse/tidytemplate", + "Config/testthat/edition": "3", + "Encoding": "UTF-8", + "LazyData": "true", + "RoxygenNote": "7.2.3", + "NeedsCompilation": "no", + "Author": "Hadley Wickham [aut, cre, cph], Posit Software, PBC [cph, fnd]", + "Maintainer": "Hadley Wickham ", + "Repository": "RSPM" }, "survival": { "Package": "survival", - "Version": "3.5-3", - "Source": "Repository", + "Version": "3.8-3", + "Source": "Repository", + "Title": "Survival Analysis", + "Priority": "recommended", + "Date": "2024-12-17", + "Depends": [ + "R (>= 3.5.0)" + ], + "Imports": [ + "graphics", + "Matrix", + "methods", + "splines", + "stats", + "utils" + ], + "LazyData": "Yes", + "LazyDataCompression": "xz", + "ByteCompile": "Yes", + "Authors@R": "c(person(c(\"Terry\", \"M\"), \"Therneau\", email=\"therneau.terry@mayo.edu\", role=c(\"aut\", \"cre\")), person(\"Thomas\", \"Lumley\", role=c(\"ctb\", \"trl\"), comment=\"original S->R port and R maintainer until 2009\"), person(\"Atkinson\", \"Elizabeth\", role=\"ctb\"), person(\"Crowson\", \"Cynthia\", role=\"ctb\"))", + "Description": "Contains the core survival analysis routines, including definition of Surv objects, Kaplan-Meier and Aalen-Johansen (multi-state) curves, Cox models, and parametric accelerated failure time models.", + "License": "LGPL (>= 2)", + "URL": "https://github.com/therneau/survival", + "NeedsCompilation": "yes", + "Author": "Terry M Therneau [aut, cre], Thomas Lumley [ctb, trl] (original S->R port and R maintainer until 2009), Atkinson Elizabeth [ctb], Crowson Cynthia [ctb]", + "Maintainer": "Terry M Therneau ", "Repository": "RSPM", - "Hash": "aea2b8787db7088ba50ba389848569ee", - "Requirements": [ - "Matrix" - ] + "Encoding": "UTF-8" }, "sys": { "Package": "sys", - "Version": "3.4.1", - "Source": "Repository", - "Repository": "RSPM", - "Hash": "34c16f1ef796057bfa06d3f4ff818a5d", - "Requirements": [] - }, - "systemfonts": { - "Package": "systemfonts", - "Version": "1.0.4", - "Source": "Repository", - "Repository": "CRAN", - "Hash": "90b28393209827327de889f49935140a", - "Requirements": [ - "cpp11" - ] + "Version": "3.4.3", + "Source": "Repository", + "Type": "Package", + "Title": "Powerful and Reliable Tools for Running System Commands in R", + "Authors@R": "c(person(\"Jeroen\", \"Ooms\", role = c(\"aut\", \"cre\"), email = \"jeroenooms@gmail.com\", comment = c(ORCID = \"0000-0002-4035-0289\")), person(\"Gábor\", \"Csárdi\", , \"csardi.gabor@gmail.com\", role = \"ctb\"))", + "Description": "Drop-in replacements for the base system2() function with fine control and consistent behavior across platforms. Supports clean interruption, timeout, background tasks, and streaming STDIN / STDOUT / STDERR over binary or text connections. Arguments on Windows automatically get encoded and quoted to work on different locales.", + "License": "MIT + file LICENSE", + "URL": "https://jeroen.r-universe.dev/sys", + "BugReports": "https://github.com/jeroen/sys/issues", + "Encoding": "UTF-8", + "RoxygenNote": "7.1.1", + "Suggests": [ + "unix (>= 1.4)", + "spelling", + "testthat" + ], + "Language": "en-US", + "NeedsCompilation": "yes", + "Author": "Jeroen Ooms [aut, cre] (), Gábor Csárdi [ctb]", + "Maintainer": "Jeroen Ooms ", + "Repository": "RSPM" }, - "testthat": { - "Package": "testthat", - "Version": "3.1.6", - "Source": "Repository", - "Repository": "CRAN", - "Hash": "7910146255835c66e9eb272fb215248d", - "Requirements": [ - "R6", + "tibble": { + "Package": "tibble", + "Version": "3.2.1", + "Source": "Repository", + "Title": "Simple Data Frames", + "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\", email = \"hadley@rstudio.com\"), person(given = \"Romain\", family = \"Francois\", role = \"ctb\", email = \"romain@r-enthusiasts.com\"), person(given = \"Jennifer\", family = \"Bryan\", role = \"ctb\", email = \"jenny@rstudio.com\"), person(given = \"RStudio\", role = c(\"cph\", \"fnd\")))", + "Description": "Provides a 'tbl_df' class (the 'tibble') with stricter checking and better formatting than the traditional data frame.", + "License": "MIT + file LICENSE", + "URL": "https://tibble.tidyverse.org/, https://github.com/tidyverse/tibble", + "BugReports": "https://github.com/tidyverse/tibble/issues", + "Depends": [ + "R (>= 3.4.0)" + ], + "Imports": [ + "fansi (>= 0.4.0)", + "lifecycle (>= 1.0.0)", + "magrittr", + "methods", + "pillar (>= 1.8.1)", + "pkgconfig", + "rlang (>= 1.0.2)", + "utils", + "vctrs (>= 0.4.2)" + ], + "Suggests": [ + "bench", + "bit64", + "blob", "brio", "callr", "cli", - "desc", - "digest", - "ellipsis", + "covr", + "crayon (>= 1.3.4)", + "DiagrammeR", + "dplyr", "evaluate", - "jsonlite", - "lifecycle", - "magrittr", + "formattable", + "ggplot2", + "here", + "hms", + "htmltools", + "knitr", + "lubridate", + "mockr", + "nycflights13", + "pkgbuild", "pkgload", - "praise", - "processx", - "ps", - "rlang", - "waldo", + "purrr", + "rmarkdown", + "stringi", + "testthat (>= 3.0.2)", + "tidyr", "withr" - ] - }, - "textshaping": { - "Package": "textshaping", - "Version": "0.3.6", - "Source": "Repository", - "Repository": "CRAN", - "Hash": "1ab6223d3670fac7143202cb6a2d43d5", - "Requirements": [ - "cpp11", - "systemfonts" - ] - }, - "tibble": { - "Package": "tibble", - "Version": "3.1.8", - "Source": "Repository", - "Repository": "CRAN", - "Hash": "56b6934ef0f8c68225949a8672fe1a8f", - "Requirements": [ - "fansi", - "lifecycle", - "magrittr", - "pillar", - "pkgconfig", - "rlang", - "vctrs" - ] + ], + "VignetteBuilder": "knitr", + "Encoding": "UTF-8", + "RoxygenNote": "7.2.3", + "Config/testthat/edition": "3", + "Config/testthat/parallel": "true", + "Config/testthat/start-first": "vignette-formats, as_tibble, add, invariants", + "Config/autostyle/scope": "line_breaks", + "Config/autostyle/strict": "true", + "Config/autostyle/rmd": "false", + "Config/Needs/website": "tidyverse/tidytemplate", + "NeedsCompilation": "yes", + "Author": "Kirill Müller [aut, cre] (), Hadley Wickham [aut], Romain Francois [ctb], Jennifer Bryan [ctb], RStudio [cph, fnd]", + "Maintainer": "Kirill Müller ", + "Repository": "RSPM" }, "tidyr": { "Package": "tidyr", - "Version": "1.3.0", + "Version": "1.3.1", "Source": "Repository", - "Repository": "RSPM", - "Hash": "e47debdc7ce599b070c8e78e8ac0cfcf", - "Requirements": [ - "cli", - "cpp11", - "dplyr", + "Title": "Tidy Messy Data", + "Authors@R": "c( person(\"Hadley\", \"Wickham\", , \"hadley@posit.co\", role = c(\"aut\", \"cre\")), person(\"Davis\", \"Vaughan\", , \"davis@posit.co\", role = \"aut\"), person(\"Maximilian\", \"Girlich\", role = \"aut\"), person(\"Kevin\", \"Ushey\", , \"kevin@posit.co\", role = \"ctb\"), person(\"Posit Software, PBC\", role = c(\"cph\", \"fnd\")) )", + "Description": "Tools to help to create tidy data, where each column is a variable, each row is an observation, and each cell contains a single value. 'tidyr' contains tools for changing the shape (pivoting) and hierarchy (nesting and 'unnesting') of a dataset, turning deeply nested lists into rectangular data frames ('rectangling'), and extracting values out of string columns. It also includes tools for working with missing values (both implicit and explicit).", + "License": "MIT + file LICENSE", + "URL": "https://tidyr.tidyverse.org, https://github.com/tidyverse/tidyr", + "BugReports": "https://github.com/tidyverse/tidyr/issues", + "Depends": [ + "R (>= 3.6)" + ], + "Imports": [ + "cli (>= 3.4.1)", + "dplyr (>= 1.0.10)", "glue", - "lifecycle", + "lifecycle (>= 1.0.3)", "magrittr", - "purrr", - "rlang", - "stringr", - "tibble", - "tidyselect", - "vctrs" - ] + "purrr (>= 1.0.1)", + "rlang (>= 1.1.1)", + "stringr (>= 1.5.0)", + "tibble (>= 2.1.1)", + "tidyselect (>= 1.2.0)", + "utils", + "vctrs (>= 0.5.2)" + ], + "Suggests": [ + "covr", + "data.table", + "knitr", + "readr", + "repurrrsive (>= 1.1.0)", + "rmarkdown", + "testthat (>= 3.0.0)" + ], + "LinkingTo": [ + "cpp11 (>= 0.4.0)" + ], + "VignetteBuilder": "knitr", + "Config/Needs/website": "tidyverse/tidytemplate", + "Config/testthat/edition": "3", + "Encoding": "UTF-8", + "LazyData": "true", + "RoxygenNote": "7.3.0", + "NeedsCompilation": "yes", + "Author": "Hadley Wickham [aut, cre], Davis Vaughan [aut], Maximilian Girlich [aut], Kevin Ushey [ctb], Posit Software, PBC [cph, fnd]", + "Maintainer": "Hadley Wickham ", + "Repository": "RSPM" }, "tidyselect": { "Package": "tidyselect", - "Version": "1.2.0", + "Version": "1.2.1", "Source": "Repository", - "Repository": "CRAN", - "Hash": "79540e5fcd9e0435af547d885f184fd5", - "Requirements": [ - "cli", - "glue", - "lifecycle", - "rlang", - "vctrs", + "Title": "Select from a Set of Strings", + "Authors@R": "c( person(\"Lionel\", \"Henry\", , \"lionel@posit.co\", role = c(\"aut\", \"cre\")), person(\"Hadley\", \"Wickham\", , \"hadley@posit.co\", role = \"aut\"), person(\"Posit Software, PBC\", role = c(\"cph\", \"fnd\")) )", + "Description": "A backend for the selecting functions of the 'tidyverse'. It makes it easy to implement select-like functions in your own packages in a way that is consistent with other 'tidyverse' interfaces for selection.", + "License": "MIT + file LICENSE", + "URL": "https://tidyselect.r-lib.org, https://github.com/r-lib/tidyselect", + "BugReports": "https://github.com/r-lib/tidyselect/issues", + "Depends": [ + "R (>= 3.4)" + ], + "Imports": [ + "cli (>= 3.3.0)", + "glue (>= 1.3.0)", + "lifecycle (>= 1.0.3)", + "rlang (>= 1.0.4)", + "vctrs (>= 0.5.2)", "withr" - ] - }, - "timechange": { - "Package": "timechange", - "Version": "0.2.0", - "Source": "Repository", - "Repository": "RSPM", - "Hash": "8548b44f79a35ba1791308b61e6012d7", - "Requirements": [ - "cpp11" - ] + ], + "Suggests": [ + "covr", + "crayon", + "dplyr", + "knitr", + "magrittr", + "rmarkdown", + "stringr", + "testthat (>= 3.1.1)", + "tibble (>= 2.1.3)" + ], + "VignetteBuilder": "knitr", + "ByteCompile": "true", + "Config/testthat/edition": "3", + "Config/Needs/website": "tidyverse/tidytemplate", + "Encoding": "UTF-8", + "RoxygenNote": "7.3.0.9000", + "NeedsCompilation": "yes", + "Author": "Lionel Henry [aut, cre], Hadley Wickham [aut], Posit Software, PBC [cph, fnd]", + "Maintainer": "Lionel Henry ", + "Repository": "RSPM" }, "timevis": { "Package": "timevis", "Version": "2.1.0", "Source": "Repository", - "Repository": "RSPM", - "Hash": "322f35cae1fcac54fe0c14201fb1fecf", - "Requirements": [ - "htmltools", - "htmlwidgets", + "Title": "Create Interactive Timeline Visualizations in R", + "Authors@R": "c( person(\"Dean\", \"Attali\", email = \"daattali@gmail.com\", role = c(\"aut\", \"cre\"), comment = c(\"R interface\", ORCID=\"0000-0002-5645-3493\")), person(family = \"Almende B.V.\", role = c(\"aut\", \"cph\"), comment = \"vis.js Timeline library, https://visjs.github.io/vis-timeline/docs/timeline/\") )", + "Description": "Create rich and fully interactive timeline visualizations. Timelines can be included in Shiny apps or R markdown documents. 'timevis' includes an extensive API to manipulate a timeline after creation, and supports getting data out of the visualization into R. Based on the 'vis.js' Timeline JavaScript library.", + "URL": "https://github.com/daattali/timevis", + "BugReports": "https://github.com/daattali/timevis/issues", + "Depends": [ + "R (>= 3.1.0)" + ], + "Imports": [ + "htmltools (>= 0.2.6)", + "htmlwidgets (>= 0.6)", "jsonlite", "magrittr", + "methods", "rmarkdown", "shiny" - ] + ], + "Suggests": [ + "lubridate", + "testthat (>= 0.9.1)", + "shinydisconnect" + ], + "License": "MIT + file LICENSE", + "Encoding": "UTF-8", + "LazyData": "true", + "RoxygenNote": "7.2.1", + "NeedsCompilation": "no", + "Author": "Dean Attali [aut, cre] (R interface, ), Almende B.V. [aut, cph] (vis.js Timeline library, https://visjs.github.io/vis-timeline/docs/timeline/)", + "Maintainer": "Dean Attali ", + "Repository": "CRAN" }, "tinytex": { "Package": "tinytex", - "Version": "0.44", - "Source": "Repository", - "Repository": "RSPM", - "Hash": "c0f007e2eeed7722ce13d42b84a22e07", - "Requirements": [ - "xfun" - ] + "Version": "0.56", + "Source": "Repository", + "Type": "Package", + "Title": "Helper Functions to Install and Maintain TeX Live, and Compile LaTeX Documents", + "Authors@R": "c( person(\"Yihui\", \"Xie\", role = c(\"aut\", \"cre\", \"cph\"), email = \"xie@yihui.name\", comment = c(ORCID = \"0000-0003-0645-5666\")), person(given = \"Posit Software, PBC\", role = c(\"cph\", \"fnd\")), person(\"Christophe\", \"Dervieux\", role = \"ctb\", comment = c(ORCID = \"0000-0003-4474-2498\")), person(\"Devon\", \"Ryan\", role = \"ctb\", email = \"dpryan79@gmail.com\", comment = c(ORCID = \"0000-0002-8549-0971\")), person(\"Ethan\", \"Heinzen\", role = \"ctb\"), person(\"Fernando\", \"Cagua\", role = \"ctb\"), person() )", + "Description": "Helper functions to install and maintain the 'LaTeX' distribution named 'TinyTeX' (), a lightweight, cross-platform, portable, and easy-to-maintain version of 'TeX Live'. This package also contains helper functions to compile 'LaTeX' documents, and install missing 'LaTeX' packages automatically.", + "Imports": [ + "xfun (>= 0.48)" + ], + "Suggests": [ + "testit", + "rstudioapi" + ], + "License": "MIT + file LICENSE", + "URL": "https://github.com/rstudio/tinytex", + "BugReports": "https://github.com/rstudio/tinytex/issues", + "Encoding": "UTF-8", + "RoxygenNote": "7.3.2", + "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]", + "Maintainer": "Yihui Xie ", + "Repository": "RSPM" }, "tippy": { "Package": "tippy", "Version": "0.1.0", "Source": "Repository", - "Repository": "CRAN", - "Hash": "39b1d69229e30314e7cba023c777f52d", - "Requirements": [ - "htmltools", + "Title": "Add Tooltips to 'R markdown' Documents or 'Shiny' Apps", + "Authors@R": "person(\"John\", \"Coene\", email = \"jcoenep@gmail.com\", role = c(\"aut\", \"cre\"))", + "Description": "'Htmlwidget' of 'Tippyjs' to add tooltips to 'Shiny' apps and 'R markdown' documents.", + "Depends": [ + "R (>= 3.4.0)" + ], + "License": "MIT + file LICENSE", + "Encoding": "UTF-8", + "LazyData": "true", + "Imports": [ "htmlwidgets", - "jsonlite", - "shiny" - ] - }, - "triebeard": { - "Package": "triebeard", - "Version": "0.3.0", - "Source": "Repository", - "Repository": "CRAN", - "Hash": "847a9d113b78baca4a9a8639609ea228", - "Requirements": [ - "Rcpp" - ] + "htmltools", + "shiny", + "jsonlite" + ], + "RoxygenNote": "7.1.1", + "URL": "https://tippy.john-coene.com/", + "BugReports": "https://github.com/JohnCoene/tippy/issues", + "NeedsCompilation": "no", + "Author": "John Coene [aut, cre]", + "Maintainer": "John Coene ", + "Repository": "RSPM" }, "tzdb": { "Package": "tzdb", - "Version": "0.3.0", - "Source": "Repository", - "Repository": "CRAN", - "Hash": "b2e1cbce7c903eaf23ec05c58e59fb5e", - "Requirements": [ - "cpp11" - ] - }, - "urlchecker": { - "Package": "urlchecker", - "Version": "1.0.1", - "Source": "Repository", - "Repository": "CRAN", - "Hash": "409328b8e1253c8d729a7836fe7f7a16", - "Requirements": [ - "cli", - "curl", - "xml2" - ] - }, - "urltools": { - "Package": "urltools", - "Version": "1.7.3", - "Source": "Repository", - "Repository": "CRAN", - "Hash": "e86a704261a105f4703f653e05defa3e", - "Requirements": [ - "Rcpp", - "triebeard" - ] - }, - "usethis": { - "Package": "usethis", - "Version": "2.1.6", + "Version": "0.4.0", "Source": "Repository", - "Repository": "CRAN", - "Hash": "a67a22c201832b12c036cc059f1d137d", - "Requirements": [ - "cli", - "clipr", - "crayon", - "curl", - "desc", - "fs", - "gert", - "gh", - "glue", - "jsonlite", - "lifecycle", - "purrr", - "rappdirs", - "rlang", - "rprojroot", - "rstudioapi", - "whisker", - "withr", - "yaml" - ] + "Title": "Time Zone Database Information", + "Authors@R": "c( person(\"Davis\", \"Vaughan\", , \"davis@posit.co\", role = c(\"aut\", \"cre\")), person(\"Howard\", \"Hinnant\", role = \"cph\", comment = \"Author of the included date library\"), person(\"Posit Software, PBC\", role = c(\"cph\", \"fnd\")) )", + "Description": "Provides an up-to-date copy of the Internet Assigned Numbers Authority (IANA) Time Zone Database. It is updated periodically to reflect changes made by political bodies to time zone boundaries, UTC offsets, and daylight saving time rules. Additionally, this package provides a C++ interface for working with the 'date' library. 'date' provides comprehensive support for working with dates and date-times, which this package exposes to make it easier for other R packages to utilize. Headers are provided for calendar specific calculations, along with a limited interface for time zone manipulations.", + "License": "MIT + file LICENSE", + "URL": "https://tzdb.r-lib.org, https://github.com/r-lib/tzdb", + "BugReports": "https://github.com/r-lib/tzdb/issues", + "Depends": [ + "R (>= 3.5.0)" + ], + "Suggests": [ + "covr", + "testthat (>= 3.0.0)" + ], + "LinkingTo": [ + "cpp11 (>= 0.4.2)" + ], + "Biarch": "yes", + "Config/Needs/website": "tidyverse/tidytemplate", + "Config/testthat/edition": "3", + "Encoding": "UTF-8", + "RoxygenNote": "7.2.3", + "NeedsCompilation": "yes", + "Author": "Davis Vaughan [aut, cre], Howard Hinnant [cph] (Author of the included date library), Posit Software, PBC [cph, fnd]", + "Maintainer": "Davis Vaughan ", + "Repository": "RSPM" }, "utf8": { "Package": "utf8", - "Version": "1.2.3", - "Source": "Repository", - "Repository": "RSPM", - "Hash": "1fe17157424bb09c48a8b3b550c753bc", - "Requirements": [] - }, - "uuid": { - "Package": "uuid", - "Version": "1.1-0", - "Source": "Repository", - "Repository": "CRAN", - "Hash": "f1cb46c157d080b729159d407be83496", - "Requirements": [] + "Version": "1.2.4", + "Source": "Repository", + "Title": "Unicode Text Processing", + "Authors@R": "c(person(given = c(\"Patrick\", \"O.\"), family = \"Perry\", role = c(\"aut\", \"cph\")), person(given = \"Kirill\", family = \"M\\u00fcller\", role = \"cre\", email = \"kirill@cynkra.com\"), person(given = \"Unicode, Inc.\", role = c(\"cph\", \"dtc\"), comment = \"Unicode Character Database\"))", + "Description": "Process and print 'UTF-8' encoded international text (Unicode). Input, validate, normalize, encode, format, and display.", + "License": "Apache License (== 2.0) | file LICENSE", + "URL": "https://ptrckprry.com/r-utf8/, https://github.com/patperry/r-utf8", + "BugReports": "https://github.com/patperry/r-utf8/issues", + "Depends": [ + "R (>= 2.10)" + ], + "Suggests": [ + "cli", + "covr", + "knitr", + "rlang", + "rmarkdown", + "testthat (>= 3.0.0)", + "withr" + ], + "VignetteBuilder": "knitr, rmarkdown", + "Config/testthat/edition": "3", + "Encoding": "UTF-8", + "RoxygenNote": "7.2.3", + "NeedsCompilation": "yes", + "Author": "Patrick O. Perry [aut, cph], Kirill Müller [cre], Unicode, Inc. [cph, dtc] (Unicode Character Database)", + "Maintainer": "Kirill Müller ", + "Repository": "RSPM" }, "vctrs": { "Package": "vctrs", - "Version": "0.5.2", + "Version": "0.6.5", "Source": "Repository", - "Repository": "RSPM", - "Hash": "e4ffa94ceed5f124d429a5a5f0f5b378", - "Requirements": [ - "cli", + "Title": "Vector Helpers", + "Authors@R": "c( person(\"Hadley\", \"Wickham\", , \"hadley@posit.co\", role = \"aut\"), person(\"Lionel\", \"Henry\", , \"lionel@posit.co\", role = \"aut\"), person(\"Davis\", \"Vaughan\", , \"davis@posit.co\", role = c(\"aut\", \"cre\")), person(\"data.table team\", role = \"cph\", comment = \"Radix sort based on data.table's forder() and their contribution to R's order()\"), person(\"Posit Software, PBC\", role = c(\"cph\", \"fnd\")) )", + "Description": "Defines new notions of prototype and size that are used to provide tools for consistent and well-founded type-coercion and size-recycling, and are in turn connected to ideas of type- and size-stability useful for analysing function interfaces.", + "License": "MIT + file LICENSE", + "URL": "https://vctrs.r-lib.org/, https://github.com/r-lib/vctrs", + "BugReports": "https://github.com/r-lib/vctrs/issues", + "Depends": [ + "R (>= 3.5.0)" + ], + "Imports": [ + "cli (>= 3.4.0)", "glue", - "lifecycle", - "rlang" - ] + "lifecycle (>= 1.0.3)", + "rlang (>= 1.1.0)" + ], + "Suggests": [ + "bit64", + "covr", + "crayon", + "dplyr (>= 0.8.5)", + "generics", + "knitr", + "pillar (>= 1.4.4)", + "pkgdown (>= 2.0.1)", + "rmarkdown", + "testthat (>= 3.0.0)", + "tibble (>= 3.1.3)", + "waldo (>= 0.2.0)", + "withr", + "xml2", + "zeallot" + ], + "VignetteBuilder": "knitr", + "Config/Needs/website": "tidyverse/tidytemplate", + "Config/testthat/edition": "3", + "Encoding": "UTF-8", + "Language": "en-GB", + "RoxygenNote": "7.2.3", + "NeedsCompilation": "yes", + "Author": "Hadley Wickham [aut], Lionel Henry [aut], Davis Vaughan [aut, cre], data.table team [cph] (Radix sort based on data.table's forder() and their contribution to R's order()), Posit Software, PBC [cph, fnd]", + "Maintainer": "Davis Vaughan ", + "Repository": "RSPM" }, "viridisLite": { "Package": "viridisLite", - "Version": "0.4.1", + "Version": "0.4.2", "Source": "Repository", - "Repository": "CRAN", - "Hash": "62f4b5da3e08d8e5bcba6cac15603f70", - "Requirements": [] + "Type": "Package", + "Title": "Colorblind-Friendly Color Maps (Lite Version)", + "Date": "2023-05-02", + "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 is the 'lite' version of the 'viridis' package that also contains 'ggplot2' bindings for discrete and continuous color and fill scales and can be found at .", + "License": "MIT + file LICENSE", + "Encoding": "UTF-8", + "Depends": [ + "R (>= 2.10)" + ], + "Suggests": [ + "hexbin (>= 1.27.0)", + "ggplot2 (>= 1.0.1)", + "testthat", + "covr" + ], + "URL": "https://sjmgarnier.github.io/viridisLite/, https://github.com/sjmgarnier/viridisLite/", + "BugReports": "https://github.com/sjmgarnier/viridisLite/issues/", + "RoxygenNote": "7.2.3", + "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": "RSPM" }, "vroom": { "Package": "vroom", - "Version": "1.6.1", - "Source": "Repository", - "Repository": "RSPM", - "Hash": "7015a74373b83ffaef64023f4a0f5033", - "Requirements": [ + "Version": "1.6.5", + "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\")) )", + "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)" + ], + "Imports": [ "bit64", - "cli", - "cpp11", + "cli (>= 3.2.0)", "crayon", "glue", "hms", - "lifecycle", - "progress", - "rlang", - "tibble", + "lifecycle (>= 1.0.3)", + "methods", + "rlang (>= 0.4.2)", + "stats", + "tibble (>= 2.0.0)", "tidyselect", - "tzdb", - "vctrs", + "tzdb (>= 0.1.1)", + "vctrs (>= 0.2.0)", "withr" - ] - }, - "waldo": { - "Package": "waldo", - "Version": "0.4.0", - "Source": "Repository", - "Repository": "CRAN", - "Hash": "035fba89d0c86e2113120f93301b98ad", - "Requirements": [ - "cli", - "diffobj", - "fansi", - "glue", - "rematch2", - "rlang", - "tibble" - ] - }, - "whisker": { - "Package": "whisker", - "Version": "0.4.1", - "Source": "Repository", - "Repository": "RSPM", - "Hash": "c6abfa47a46d281a7d5159d0a8891e88", - "Requirements": [] - }, - "whoami": { - "Package": "whoami", - "Version": "1.3.0", - "Source": "Repository", - "Repository": "CRAN", - "Hash": "ef0f4d9b8f2cc2ebeccae1d725b8a023", - "Requirements": [ - "httr", - "jsonlite" - ] + ], + "Suggests": [ + "archive", + "bench (>= 1.1.0)", + "covr", + "curl", + "dplyr", + "forcats", + "fs", + "ggplot2", + "knitr", + "patchwork", + "prettyunits", + "purrr", + "rmarkdown", + "rstudioapi", + "scales", + "spelling", + "testthat (>= 2.1.0)", + "tidyr", + "utils", + "waldo", + "xml2" + ], + "LinkingTo": [ + "cpp11 (>= 0.2.0)", + "progress (>= 1.2.1)", + "tzdb (>= 0.1.1)" + ], + "VignetteBuilder": "knitr", + "Config/Needs/website": "nycflights13, tidyverse/tidytemplate", + "Config/testthat/edition": "3", + "Config/testthat/parallel": "false", + "Copyright": "file COPYRIGHTS", + "Encoding": "UTF-8", + "Language": "en-US", + "RoxygenNote": "7.2.3.9000", + "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]", + "Maintainer": "Jennifer Bryan ", + "Repository": "RSPM" }, "withr": { "Package": "withr", - "Version": "2.5.0", + "Version": "3.0.2", "Source": "Repository", - "Repository": "CRAN", - "Hash": "c0e49a9760983e81e55cdd9be92e7182", - "Requirements": [] + "Title": "Run Code 'With' Temporarily Modified Global State", + "Authors@R": "c( person(\"Jim\", \"Hester\", role = \"aut\"), person(\"Lionel\", \"Henry\", , \"lionel@posit.co\", role = c(\"aut\", \"cre\")), person(\"Kirill\", \"Müller\", , \"krlmlr+r@mailbox.org\", role = \"aut\"), person(\"Kevin\", \"Ushey\", , \"kevinushey@gmail.com\", role = \"aut\"), person(\"Hadley\", \"Wickham\", , \"hadley@posit.co\", role = \"aut\"), person(\"Winston\", \"Chang\", role = \"aut\"), person(\"Jennifer\", \"Bryan\", role = \"ctb\"), person(\"Richard\", \"Cotton\", role = \"ctb\"), person(\"Posit Software, PBC\", role = c(\"cph\", \"fnd\")) )", + "Description": "A set of functions to run code 'with' safely and temporarily modified global state. Many of these functions were originally a part of the 'devtools' package, this provides a simple package with limited dependencies to provide access to these functions.", + "License": "MIT + file LICENSE", + "URL": "https://withr.r-lib.org, https://github.com/r-lib/withr#readme", + "BugReports": "https://github.com/r-lib/withr/issues", + "Depends": [ + "R (>= 3.6.0)" + ], + "Imports": [ + "graphics", + "grDevices" + ], + "Suggests": [ + "callr", + "DBI", + "knitr", + "methods", + "rlang", + "rmarkdown (>= 2.12)", + "RSQLite", + "testthat (>= 3.0.0)" + ], + "VignetteBuilder": "knitr", + "Config/Needs/website": "tidyverse/tidytemplate", + "Config/testthat/edition": "3", + "Encoding": "UTF-8", + "RoxygenNote": "7.3.2", + "Collate": "'aaa.R' 'collate.R' 'connection.R' 'db.R' 'defer-exit.R' 'standalone-defer.R' 'defer.R' 'devices.R' 'local_.R' 'with_.R' 'dir.R' 'env.R' 'file.R' 'language.R' 'libpaths.R' 'locale.R' 'makevars.R' 'namespace.R' 'options.R' 'par.R' 'path.R' 'rng.R' 'seed.R' 'wrap.R' 'sink.R' 'tempfile.R' 'timezone.R' 'torture.R' 'utils.R' 'with.R'", + "NeedsCompilation": "no", + "Author": "Jim Hester [aut], Lionel Henry [aut, cre], Kirill Müller [aut], Kevin Ushey [aut], Hadley Wickham [aut], Winston Chang [aut], Jennifer Bryan [ctb], Richard Cotton [ctb], Posit Software, PBC [cph, fnd]", + "Maintainer": "Lionel Henry ", + "Repository": "CRAN" }, "xfun": { "Package": "xfun", - "Version": "0.37", - "Source": "Repository", - "Repository": "RSPM", - "Hash": "a6860e1400a8fd1ddb6d9b4230cc34ab", - "Requirements": [] + "Version": "0.52", + "Source": "Repository", + "Type": "Package", + "Title": "Supporting Functions for Packages Maintained by 'Yihui Xie'", + "Authors@R": "c( person(\"Yihui\", \"Xie\", role = c(\"aut\", \"cre\", \"cph\"), email = \"xie@yihui.name\", comment = c(ORCID = \"0000-0003-0645-5666\", URL = \"https://yihui.org\")), person(\"Wush\", \"Wu\", role = \"ctb\"), person(\"Daijiang\", \"Li\", role = \"ctb\"), person(\"Xianying\", \"Tan\", role = \"ctb\"), person(\"Salim\", \"Brüggemann\", role = \"ctb\", email = \"salim-b@pm.me\", comment = c(ORCID = \"0000-0002-5329-5987\")), person(\"Christophe\", \"Dervieux\", role = \"ctb\"), person() )", + "Description": "Miscellaneous functions commonly used in other packages maintained by 'Yihui Xie'.", + "Depends": [ + "R (>= 3.2.0)" + ], + "Imports": [ + "grDevices", + "stats", + "tools" + ], + "Suggests": [ + "testit", + "parallel", + "codetools", + "methods", + "rstudioapi", + "tinytex (>= 0.30)", + "mime", + "litedown (>= 0.4)", + "commonmark", + "knitr (>= 1.50)", + "remotes", + "pak", + "curl", + "xml2", + "jsonlite", + "magick", + "yaml", + "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", + "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]", + "Maintainer": "Yihui Xie ", + "Repository": "RSPM" }, "xml2": { "Package": "xml2", - "Version": "1.3.3", - "Source": "Repository", - "Repository": "CRAN", - "Hash": "40682ed6a969ea5abfd351eb67833adc", - "Requirements": [] - }, - "xopen": { - "Package": "xopen", - "Version": "1.0.0", - "Source": "Repository", - "Repository": "CRAN", - "Hash": "6c85f015dee9cc7710ddd20f86881f58", - "Requirements": [ - "processx" - ] + "Version": "1.3.8", + "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\") )", + "Description": "Bindings to 'libxml2' for working with XML data using a simple, consistent interface based on 'XPath' expressions. Also supports XML schema validation; for 'XSLT' transformations see the 'xslt' package.", + "License": "MIT + file LICENSE", + "URL": "https://xml2.r-lib.org, https://r-lib.r-universe.dev/xml2", + "BugReports": "https://github.com/r-lib/xml2/issues", + "Depends": [ + "R (>= 3.6.0)" + ], + "Imports": [ + "cli", + "methods", + "rlang (>= 1.1.0)" + ], + "Suggests": [ + "covr", + "curl", + "httr", + "knitr", + "magrittr", + "mockery", + "rmarkdown", + "testthat (>= 3.2.0)", + "xslt" + ], + "VignetteBuilder": "knitr", + "Config/Needs/website": "tidyverse/tidytemplate", + "Encoding": "UTF-8", + "RoxygenNote": "7.2.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", + "NeedsCompilation": "yes", + "Author": "Hadley Wickham [aut], Jim Hester [aut], Jeroen Ooms [aut, cre], Posit Software, PBC [cph, fnd], R Foundation [ctb] (Copy of R-project homepage cached as example)", + "Maintainer": "Jeroen Ooms ", + "Repository": "RSPM" }, "xtable": { "Package": "xtable", "Version": "1.8-4", "Source": "Repository", + "Date": "2019-04-08", + "Title": "Export Tables to LaTeX or HTML", + "Authors@R": "c(person(\"David B.\", \"Dahl\", role=\"aut\"), person(\"David\", \"Scott\", role=c(\"aut\",\"cre\"), email=\"d.scott@auckland.ac.nz\"), person(\"Charles\", \"Roosen\", role=\"aut\"), person(\"Arni\", \"Magnusson\", role=\"aut\"), person(\"Jonathan\", \"Swinton\", role=\"aut\"), person(\"Ajay\", \"Shah\", role=\"ctb\"), person(\"Arne\", \"Henningsen\", role=\"ctb\"), person(\"Benno\", \"Puetz\", role=\"ctb\"), person(\"Bernhard\", \"Pfaff\", role=\"ctb\"), person(\"Claudio\", \"Agostinelli\", role=\"ctb\"), person(\"Claudius\", \"Loehnert\", role=\"ctb\"), person(\"David\", \"Mitchell\", role=\"ctb\"), person(\"David\", \"Whiting\", role=\"ctb\"), person(\"Fernando da\", \"Rosa\", role=\"ctb\"), person(\"Guido\", \"Gay\", role=\"ctb\"), person(\"Guido\", \"Schulz\", role=\"ctb\"), person(\"Ian\", \"Fellows\", role=\"ctb\"), person(\"Jeff\", \"Laake\", role=\"ctb\"), person(\"John\", \"Walker\", role=\"ctb\"), person(\"Jun\", \"Yan\", role=\"ctb\"), person(\"Liviu\", \"Andronic\", role=\"ctb\"), person(\"Markus\", \"Loecher\", role=\"ctb\"), person(\"Martin\", \"Gubri\", role=\"ctb\"), person(\"Matthieu\", \"Stigler\", role=\"ctb\"), person(\"Robert\", \"Castelo\", role=\"ctb\"), person(\"Seth\", \"Falcon\", role=\"ctb\"), person(\"Stefan\", \"Edwards\", role=\"ctb\"), person(\"Sven\", \"Garbade\", role=\"ctb\"), person(\"Uwe\", \"Ligges\", role=\"ctb\"))", + "Maintainer": "David Scott ", + "Imports": [ + "stats", + "utils" + ], + "Suggests": [ + "knitr", + "plm", + "zoo", + "survival" + ], + "VignetteBuilder": "knitr", + "Description": "Coerce data to LaTeX and HTML tables.", + "URL": "http://xtable.r-forge.r-project.org/", + "Depends": [ + "R (>= 2.10.0)" + ], + "License": "GPL (>= 2)", "Repository": "CRAN", - "Hash": "b8acdf8af494d9ec19ccb2481a9b11c2", - "Requirements": [] + "NeedsCompilation": "no", + "Author": "David B. Dahl [aut], David Scott [aut, cre], Charles Roosen [aut], Arni Magnusson [aut], Jonathan Swinton [aut], Ajay Shah [ctb], Arne Henningsen [ctb], Benno Puetz [ctb], Bernhard Pfaff [ctb], Claudio Agostinelli [ctb], Claudius Loehnert [ctb], David Mitchell [ctb], David Whiting [ctb], Fernando da Rosa [ctb], Guido Gay [ctb], Guido Schulz [ctb], Ian Fellows [ctb], Jeff Laake [ctb], John Walker [ctb], Jun Yan [ctb], Liviu Andronic [ctb], Markus Loecher [ctb], Martin Gubri [ctb], Matthieu Stigler [ctb], Robert Castelo [ctb], Seth Falcon [ctb], Stefan Edwards [ctb], Sven Garbade [ctb], Uwe Ligges [ctb]", + "Encoding": "UTF-8" }, "yaml": { "Package": "yaml", - "Version": "2.3.7", - "Source": "Repository", - "Repository": "RSPM", - "Hash": "0d0056cc5383fbc240ccd0cb584bf436", - "Requirements": [] - }, - "zip": { - "Package": "zip", - "Version": "2.2.2", - "Source": "Repository", + "Version": "2.3.10", + "Source": "Repository", + "Type": "Package", + "Title": "Methods to Convert R Data to YAML and Back", + "Date": "2024-07-22", + "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]", + "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", "Repository": "RSPM", - "Hash": "c42bfcec3fa6a0cce17ce1f8bc684f88", - "Requirements": [] + "Encoding": "UTF-8" } } } diff --git a/renv/activate.R b/renv/activate.R index 019b5a66..90b251ca 100644 --- a/renv/activate.R +++ b/renv/activate.R @@ -2,10 +2,28 @@ local({ # the requested version of renv - version <- "0.16.0" + version <- "1.1.4" + attr(version, "sha") <- NULL # the project directory - project <- getwd() + project <- Sys.getenv("RENV_PROJECT") + if (!nzchar(project)) + project <- getwd() + + # use start-up diagnostics if enabled + diagnostics <- Sys.getenv("RENV_STARTUP_DIAGNOSTICS", unset = "FALSE") + if (diagnostics) { + start <- Sys.time() + profile <- tempfile("renv-startup-", fileext = ".Rprof") + utils::Rprof(profile) + on.exit({ + utils::Rprof(NULL) + elapsed <- signif(difftime(Sys.time(), start, units = "auto"), digits = 2L) + writeLines(sprintf("- renv took %s to run the autoloader.", format(elapsed))) + writeLines(sprintf("- Profile: %s", profile)) + print(utils::summaryRprof(profile)) + }, add = TRUE) + } # figure out whether the autoloader is enabled enabled <- local({ @@ -15,8 +33,16 @@ local({ if (!is.null(override)) return(override) + # if we're being run in a context where R_LIBS is already set, + # don't load -- presumably we're being run as a sub-process and + # the parent process has already set up library paths for us + rcmd <- Sys.getenv("R_CMD", unset = NA) + rlibs <- Sys.getenv("R_LIBS", unset = NA) + if (!is.na(rlibs) && !is.na(rcmd)) + return(FALSE) + # next, check environment variables - # TODO: prefer using the configuration one in the future + # prefer using the configuration one in the future envvars <- c( "RENV_CONFIG_AUTOLOADER_ENABLED", "RENV_AUTOLOADER_ENABLED", @@ -34,9 +60,22 @@ local({ }) - if (!enabled) + # bail if we're not enabled + if (!enabled) { + + # if we're not enabled, we might still need to manually load + # the user profile here + profile <- Sys.getenv("R_PROFILE_USER", unset = "~/.Rprofile") + if (file.exists(profile)) { + cfg <- Sys.getenv("RENV_CONFIG_USER_PROFILE", unset = "TRUE") + if (tolower(cfg) %in% c("true", "t", "1")) + sys.source(profile, envir = globalenv()) + } + return(FALSE) + } + # avoid recursion if (identical(getOption("renv.autoloader.running"), TRUE)) { warning("ignoring recursive attempt to run renv autoloader") @@ -59,22 +98,150 @@ local({ unloadNamespace("renv") # load bootstrap tools + ansify <- function(text) { + if (renv_ansify_enabled()) + renv_ansify_enhanced(text) + else + renv_ansify_default(text) + } + + renv_ansify_enabled <- function() { + + override <- Sys.getenv("RENV_ANSIFY_ENABLED", unset = NA) + if (!is.na(override)) + return(as.logical(override)) + + pane <- Sys.getenv("RSTUDIO_CHILD_PROCESS_PANE", unset = NA) + if (identical(pane, "build")) + return(FALSE) + + testthat <- Sys.getenv("TESTTHAT", unset = "false") + if (tolower(testthat) %in% "true") + return(FALSE) + + iderun <- Sys.getenv("R_CLI_HAS_HYPERLINK_IDE_RUN", unset = "false") + if (tolower(iderun) %in% "false") + return(FALSE) + + TRUE + + } + + renv_ansify_default <- function(text) { + text + } + + renv_ansify_enhanced <- function(text) { + + # R help links + pattern <- "`\\?(renv::(?:[^`])+)`" + replacement <- "`\033]8;;x-r-help:\\1\a?\\1\033]8;;\a`" + text <- gsub(pattern, replacement, text, perl = TRUE) + + # runnable code + pattern <- "`(renv::(?:[^`])+)`" + replacement <- "`\033]8;;x-r-run:\\1\a\\1\033]8;;\a`" + text <- gsub(pattern, replacement, text, perl = TRUE) + + # return ansified text + text + + } + + renv_ansify_init <- function() { + + envir <- renv_envir_self() + if (renv_ansify_enabled()) + assign("ansify", renv_ansify_enhanced, envir = envir) + else + assign("ansify", renv_ansify_default, envir = envir) + + } + `%||%` <- function(x, y) { - if (is.environment(x) || length(x)) x else y + if (is.null(x)) y else x + } + + catf <- function(fmt, ..., appendLF = TRUE) { + + quiet <- getOption("renv.bootstrap.quiet", default = FALSE) + if (quiet) + return(invisible()) + + msg <- sprintf(fmt, ...) + cat(msg, file = stdout(), sep = if (appendLF) "\n" else "") + + invisible(msg) + + } + + header <- function(label, + ..., + prefix = "#", + suffix = "-", + n = min(getOption("width"), 78)) + { + label <- sprintf(label, ...) + n <- max(n - nchar(label) - nchar(prefix) - 2L, 8L) + if (n <= 0) + return(paste(prefix, label)) + + tail <- paste(rep.int(suffix, n), collapse = "") + paste0(prefix, " ", label, " ", tail) + + } + + heredoc <- function(text, leave = 0) { + + # remove leading, trailing whitespace + trimmed <- gsub("^\\s*\\n|\\n\\s*$", "", text) + + # split into lines + lines <- strsplit(trimmed, "\n", fixed = TRUE)[[1L]] + + # compute common indent + indent <- regexpr("[^[:space:]]", lines) + common <- min(setdiff(indent, -1L)) - leave + text <- paste(substring(lines, common), collapse = "\n") + + # substitute in ANSI links for executable renv code + ansify(text) + } bootstrap <- function(version, library) { + friendly <- renv_bootstrap_version_friendly(version) + section <- header(sprintf("Bootstrapping renv %s", friendly)) + catf(section) + # attempt to download renv - tarball <- tryCatch(renv_bootstrap_download(version), error = identity) - if (inherits(tarball, "error")) - stop("failed to download renv ", version) + catf("- Downloading renv ... ", appendLF = FALSE) + withCallingHandlers( + tarball <- renv_bootstrap_download(version), + error = function(err) { + catf("FAILED") + stop("failed to download:\n", conditionMessage(err)) + } + ) + catf("OK") + on.exit(unlink(tarball), add = TRUE) # now attempt to install - status <- tryCatch(renv_bootstrap_install(version, tarball, library), error = identity) - if (inherits(status, "error")) - stop("failed to install renv ", version) + catf("- Installing renv ... ", appendLF = FALSE) + withCallingHandlers( + status <- renv_bootstrap_install(version, tarball, library), + error = function(err) { + catf("FAILED") + stop("failed to install:\n", conditionMessage(err)) + } + ) + catf("OK") + # add empty line to break up bootstrapping from normal output + catf("") + + return(invisible()) } renv_bootstrap_tests_running <- function() { @@ -83,28 +250,32 @@ local({ renv_bootstrap_repos <- function() { + # get CRAN repository + cran <- getOption("renv.repos.cran", "https://cloud.r-project.org") + # check for repos override repos <- Sys.getenv("RENV_CONFIG_REPOS_OVERRIDE", unset = NA) - if (!is.na(repos)) + if (!is.na(repos)) { + + # check for RSPM; if set, use a fallback repository for renv + rspm <- Sys.getenv("RSPM", unset = NA) + if (identical(rspm, repos)) + repos <- c(RSPM = rspm, CRAN = cran) + return(repos) + } + # check for lockfile repositories repos <- tryCatch(renv_bootstrap_repos_lockfile(), error = identity) if (!inherits(repos, "error") && length(repos)) return(repos) - # if we're testing, re-use the test repositories - if (renv_bootstrap_tests_running()) - return(getOption("renv.tests.repos")) - # retrieve current repos repos <- getOption("repos") # ensure @CRAN@ entries are resolved - repos[repos == "@CRAN@"] <- getOption( - "renv.repos.cran", - "https://cloud.r-project.org" - ) + repos[repos == "@CRAN@"] <- cran # add in renv.bootstrap.repos if set default <- c(FALLBACK = "https://cloud.r-project.org") @@ -143,33 +314,34 @@ local({ renv_bootstrap_download <- function(version) { - # if the renv version number has 4 components, assume it must - # be retrieved via github - nv <- numeric_version(version) - components <- unclass(nv)[[1]] - - # if this appears to be a development version of 'renv', we'll - # try to restore from github - dev <- length(components) == 4L - - # begin collecting different methods for finding renv - methods <- c( - renv_bootstrap_download_tarball, - if (dev) - renv_bootstrap_download_github - else c( - renv_bootstrap_download_cran_latest, - renv_bootstrap_download_cran_archive + sha <- attr(version, "sha", exact = TRUE) + + methods <- if (!is.null(sha)) { + + # attempting to bootstrap a development version of renv + c( + function() renv_bootstrap_download_tarball(sha), + function() renv_bootstrap_download_github(sha) ) - ) + + } else { + + # attempting to bootstrap a release version of renv + c( + function() renv_bootstrap_download_tarball(version), + function() renv_bootstrap_download_cran_latest(version), + function() renv_bootstrap_download_cran_archive(version) + ) + + } for (method in methods) { - path <- tryCatch(method(version), error = identity) + path <- tryCatch(method(), error = identity) if (is.character(path) && file.exists(path)) return(path) } - stop("failed to download renv ", version) + stop("All download methods failed") } @@ -192,8 +364,11 @@ local({ quiet = TRUE ) - if ("headers" %in% names(formals(utils::download.file))) - args$headers <- renv_bootstrap_download_custom_headers(url) + if ("headers" %in% names(formals(utils::download.file))) { + headers <- renv_bootstrap_download_custom_headers(url) + if (length(headers) && is.character(headers)) + args$headers <- headers + } do.call(utils::download.file, args) @@ -233,8 +408,6 @@ local({ type <- spec$type repos <- spec$repos - message("* Downloading renv ", version, " ... ", appendLF = FALSE) - baseurl <- utils::contrib.url(repos = repos, type = type) ext <- if (identical(type, "source")) ".tar.gz" @@ -251,13 +424,10 @@ local({ condition = identity ) - if (inherits(status, "condition")) { - message("FAILED") + if (inherits(status, "condition")) return(FALSE) - } # report success and return - message("OK (downloaded ", type, ")") destfile } @@ -277,10 +447,21 @@ local({ for (type in types) { for (repos in renv_bootstrap_repos()) { + # build arguments for utils::available.packages() call + args <- list(type = type, repos = repos) + + # add custom headers if available -- note that + # utils::available.packages() will pass this to download.file() + if ("headers" %in% names(formals(utils::download.file))) { + headers <- renv_bootstrap_download_custom_headers(repos) + if (length(headers) && is.character(headers)) + args$headers <- headers + } + # retrieve package database db <- tryCatch( as.data.frame( - utils::available.packages(type = type, repos = repos), + do.call(utils::available.packages, args), stringsAsFactors = FALSE ), error = identity @@ -314,8 +495,6 @@ local({ urls <- file.path(repos, "src/contrib/Archive/renv", name) destfile <- file.path(tempdir(), name) - message("* Downloading renv ", version, " ... ", appendLF = FALSE) - for (url in urls) { status <- tryCatch( @@ -323,14 +502,11 @@ local({ condition = identity ) - if (identical(status, 0L)) { - message("OK") + if (identical(status, 0L)) return(destfile) - } } - message("FAILED") return(FALSE) } @@ -344,8 +520,7 @@ local({ return() # allow directories - info <- file.info(tarball, extra_cols = FALSE) - if (identical(info$isdir, TRUE)) { + if (dir.exists(tarball)) { name <- sprintf("renv_%s.tar.gz", version) tarball <- file.path(tarball, name) } @@ -354,7 +529,7 @@ local({ if (!file.exists(tarball)) { # let the user know we weren't able to honour their request - fmt <- "* RENV_BOOTSTRAP_TARBALL is set (%s) but does not exist." + fmt <- "- RENV_BOOTSTRAP_TARBALL is set (%s) but does not exist." msg <- sprintf(fmt, tarball) warning(msg) @@ -363,14 +538,19 @@ local({ } - fmt <- "* Bootstrapping with tarball at path '%s'." - msg <- sprintf(fmt, tarball) - message(msg) - + catf("- Using local tarball '%s'.", tarball) tarball } + renv_bootstrap_github_token <- function() { + for (envvar in c("GITHUB_TOKEN", "GITHUB_PAT", "GH_TOKEN")) { + envval <- Sys.getenv(envvar, unset = NA) + if (!is.na(envval)) + return(envval) + } + } + renv_bootstrap_download_github <- function(version) { enabled <- Sys.getenv("RENV_BOOTSTRAP_FROM_GITHUB", unset = "TRUE") @@ -378,23 +558,24 @@ local({ return(FALSE) # prepare download options - pat <- Sys.getenv("GITHUB_PAT") - if (nzchar(Sys.which("curl")) && nzchar(pat)) { + token <- renv_bootstrap_github_token() + if (is.null(token)) + token <- "" + + if (nzchar(Sys.which("curl")) && nzchar(token)) { fmt <- "--location --fail --header \"Authorization: token %s\"" - extra <- sprintf(fmt, pat) + extra <- sprintf(fmt, token) saved <- options("download.file.method", "download.file.extra") options(download.file.method = "curl", download.file.extra = extra) on.exit(do.call(base::options, saved), add = TRUE) - } else if (nzchar(Sys.which("wget")) && nzchar(pat)) { + } else if (nzchar(Sys.which("wget")) && nzchar(token)) { fmt <- "--header=\"Authorization: token %s\"" - extra <- sprintf(fmt, pat) + extra <- sprintf(fmt, token) saved <- options("download.file.method", "download.file.extra") options(download.file.method = "wget", download.file.extra = extra) on.exit(do.call(base::options, saved), add = TRUE) } - message("* Downloading renv ", version, " from GitHub ... ", appendLF = FALSE) - url <- file.path("https://api.github.com/repos/rstudio/renv/tarball", version) name <- sprintf("renv_%s.tar.gz", version) destfile <- file.path(tempdir(), name) @@ -404,26 +585,105 @@ local({ condition = identity ) - if (!identical(status, 0L)) { - message("FAILED") + if (!identical(status, 0L)) return(FALSE) - } - message("OK") + renv_bootstrap_download_augment(destfile) + return(destfile) } + # Add Sha to DESCRIPTION. This is stop gap until #890, after which we + # can use renv::install() to fully capture metadata. + renv_bootstrap_download_augment <- function(destfile) { + sha <- renv_bootstrap_git_extract_sha1_tar(destfile) + if (is.null(sha)) { + return() + } + + # Untar + tempdir <- tempfile("renv-github-") + on.exit(unlink(tempdir, recursive = TRUE), add = TRUE) + untar(destfile, exdir = tempdir) + pkgdir <- dir(tempdir, full.names = TRUE)[[1]] + + # Modify description + desc_path <- file.path(pkgdir, "DESCRIPTION") + desc_lines <- readLines(desc_path) + remotes_fields <- c( + "RemoteType: github", + "RemoteHost: api.github.com", + "RemoteRepo: renv", + "RemoteUsername: rstudio", + "RemotePkgRef: rstudio/renv", + paste("RemoteRef: ", sha), + paste("RemoteSha: ", sha) + ) + writeLines(c(desc_lines[desc_lines != ""], remotes_fields), con = desc_path) + + # Re-tar + local({ + old <- setwd(tempdir) + on.exit(setwd(old), add = TRUE) + + tar(destfile, compression = "gzip") + }) + invisible() + } + + # Extract the commit hash from a git archive. Git archives include the SHA1 + # hash as the comment field of the tarball pax extended header + # (see https://www.kernel.org/pub/software/scm/git/docs/git-archive.html) + # For GitHub archives this should be the first header after the default one + # (512 byte) header. + renv_bootstrap_git_extract_sha1_tar <- function(bundle) { + + # open the bundle for reading + # We use gzcon for everything because (from ?gzcon) + # > Reading from a connection which does not supply a 'gzip' magic + # > header is equivalent to reading from the original connection + conn <- gzcon(file(bundle, open = "rb", raw = TRUE)) + on.exit(close(conn)) + + # The default pax header is 512 bytes long and the first pax extended header + # with the comment should be 51 bytes long + # `52 comment=` (11 chars) + 40 byte SHA1 hash + len <- 0x200 + 0x33 + res <- rawToChar(readBin(conn, "raw", n = len)[0x201:len]) + + if (grepl("^52 comment=", res)) { + sub("52 comment=", "", res) + } else { + NULL + } + } + renv_bootstrap_install <- function(version, tarball, library) { # attempt to install it into project library - message("* Installing renv ", version, " ... ", appendLF = FALSE) dir.create(library, showWarnings = FALSE, recursive = TRUE) + output <- renv_bootstrap_install_impl(library, tarball) + + # check for successful install + status <- attr(output, "status") + if (is.null(status) || identical(status, 0L)) + return(status) + + # an error occurred; report it + header <- "installation of renv failed" + lines <- paste(rep.int("=", nchar(header)), collapse = "") + text <- paste(c(header, lines, output), collapse = "\n") + stop(text) + + } + + renv_bootstrap_install_impl <- function(library, tarball) { # invoke using system2 so we can capture and report output bin <- R.home("bin") exe <- if (Sys.info()[["sysname"]] == "Windows") "R.exe" else "R" - r <- file.path(bin, exe) + R <- file.path(bin, exe) args <- c( "--vanilla", "CMD", "INSTALL", "--no-multiarch", @@ -431,27 +691,23 @@ local({ shQuote(path.expand(tarball)) ) - output <- system2(r, args, stdout = TRUE, stderr = TRUE) - message("Done!") + system2(R, args, stdout = TRUE, stderr = TRUE) - # check for successful install - status <- attr(output, "status") - if (is.numeric(status) && !identical(status, 0L)) { - header <- "Error installing renv:" - lines <- paste(rep.int("=", nchar(header)), collapse = "") - text <- c(header, lines, output) - writeLines(text, con = stderr()) - } + } - status + renv_bootstrap_platform_prefix_default <- function() { - } + # read version component + version <- Sys.getenv("RENV_PATHS_VERSION", unset = "R-%v") - renv_bootstrap_platform_prefix <- function() { + # expand placeholders + placeholders <- list( + list("%v", format(getRversion()[1, 1:2])), + list("%V", format(getRversion()[1, 1:3])) + ) - # construct version prefix - version <- paste(R.version$major, R.version$minor, sep = ".") - prefix <- paste("R", numeric_version(version)[1, 1:2], sep = "-") + for (placeholder in placeholders) + version <- gsub(placeholder[[1L]], placeholder[[2L]], version, fixed = TRUE) # include SVN revision for development versions of R # (to avoid sharing platform-specific artefacts with released versions of R) @@ -460,10 +716,19 @@ local({ identical(R.version[["nickname"]], "Unsuffered Consequences") if (devel) - prefix <- paste(prefix, R.version[["svn rev"]], sep = "-r") + version <- paste(version, R.version[["svn rev"]], sep = "-r") + + version + + } + + renv_bootstrap_platform_prefix <- function() { + + # construct version prefix + version <- renv_bootstrap_platform_prefix_default() # build list of path components - components <- c(prefix, R.version$platform) + components <- c(version, R.version$platform) # include prefix if provided by user prefix <- renv_bootstrap_platform_prefix_impl() @@ -484,6 +749,9 @@ local({ # if the user has requested an automatic prefix, generate it auto <- Sys.getenv("RENV_PATHS_PREFIX_AUTO", unset = NA) + if (is.na(auto) && getRversion() >= "4.4.0") + auto <- "TRUE" + if (auto %in% c("TRUE", "True", "true", "1")) return(renv_bootstrap_platform_prefix_auto()) @@ -653,34 +921,67 @@ local({ } - renv_bootstrap_validate_version <- function(version) { + renv_bootstrap_validate_version <- function(version, description = NULL) { + + # resolve description file + # + # avoid passing lib.loc to `packageDescription()` below, since R will + # use the loaded version of the package by default anyhow. note that + # this function should only be called after 'renv' is loaded + # https://github.com/rstudio/renv/issues/1625 + description <- description %||% packageDescription("renv") + + # check whether requested version 'version' matches loaded version of renv + sha <- attr(version, "sha", exact = TRUE) + valid <- if (!is.null(sha)) + renv_bootstrap_validate_version_dev(sha, description) + else + renv_bootstrap_validate_version_release(version, description) - loadedversion <- utils::packageDescription("renv", fields = "Version") - if (version == loadedversion) + if (valid) return(TRUE) - # assume four-component versions are from GitHub; three-component - # versions are from CRAN - components <- strsplit(loadedversion, "[.-]")[[1]] - remote <- if (length(components) == 4L) - paste("rstudio/renv", loadedversion, sep = "@") + # the loaded version of renv doesn't match the requested version; + # give the user instructions on how to proceed + dev <- identical(description[["RemoteType"]], "github") + remote <- if (dev) + paste("rstudio/renv", description[["RemoteSha"]], sep = "@") else - paste("renv", loadedversion, sep = "@") + paste("renv", description[["Version"]], sep = "@") - fmt <- paste( - "renv %1$s was loaded from project library, but this project is configured to use renv %2$s.", - "Use `renv::record(\"%3$s\")` to record renv %1$s in the lockfile.", - "Use `renv::restore(packages = \"renv\")` to install renv %2$s into the project library.", - sep = "\n" + # display both loaded version + sha if available + friendly <- renv_bootstrap_version_friendly( + version = description[["Version"]], + sha = if (dev) description[["RemoteSha"]] ) - msg <- sprintf(fmt, loadedversion, version, remote) - warning(msg, call. = FALSE) + fmt <- heredoc(" + renv %1$s was loaded from project library, but this project is configured to use renv %2$s. + - Use `renv::record(\"%3$s\")` to record renv %1$s in the lockfile. + - Use `renv::restore(packages = \"renv\")` to install renv %2$s into the project library. + ") + catf(fmt, friendly, renv_bootstrap_version_friendly(version), remote) FALSE } + renv_bootstrap_validate_version_dev <- function(version, description) { + + expected <- description[["RemoteSha"]] + if (!is.character(expected)) + return(FALSE) + + pattern <- sprintf("^\\Q%s\\E", version) + grepl(pattern, expected, perl = TRUE) + + } + + renv_bootstrap_validate_version_release <- function(version, description) { + expected <- description[["Version"]] + is.character(expected) && identical(expected, version) + } + renv_bootstrap_hash_text <- function(text) { hashfile <- tempfile("renv-hash-") @@ -700,6 +1001,12 @@ local({ # warn if the version of renv loaded does not match renv_bootstrap_validate_version(version) + # execute renv load hooks, if any + hooks <- getHook("renv::autoload") + for (hook in hooks) + if (is.function(hook)) + tryCatch(hook(), error = warnify) + # load the project renv::load(project) @@ -839,114 +1146,173 @@ local({ } + renv_bootstrap_version_friendly <- function(version, shafmt = NULL, sha = NULL) { + sha <- sha %||% attr(version, "sha", exact = TRUE) + parts <- c(version, sprintf(shafmt %||% " [sha: %s]", substring(sha, 1L, 7L))) + paste(parts, collapse = "") + } + + renv_bootstrap_exec <- function(project, libpath, version) { + if (!renv_bootstrap_load(project, libpath, version)) + renv_bootstrap_run(project, libpath, version) + } + + renv_bootstrap_run <- function(project, libpath, version) { + + # perform bootstrap + bootstrap(version, libpath) + + # exit early if we're just testing bootstrap + if (!is.na(Sys.getenv("RENV_BOOTSTRAP_INSTALL_ONLY", unset = NA))) + return(TRUE) + + # try again to load + if (requireNamespace("renv", lib.loc = libpath, quietly = TRUE)) { + return(renv::load(project = project)) + } + + # failed to download or load renv; warn the user + msg <- c( + "Failed to find an renv installation: the project will not be loaded.", + "Use `renv::activate()` to re-initialize the project." + ) + + warning(paste(msg, collapse = "\n"), call. = FALSE) + + } renv_json_read <- function(file = NULL, text = NULL) { + jlerr <- NULL + # if jsonlite is loaded, use that instead - if ("jsonlite" %in% loadedNamespaces()) - renv_json_read_jsonlite(file, text) + if ("jsonlite" %in% loadedNamespaces()) { + + json <- tryCatch(renv_json_read_jsonlite(file, text), error = identity) + if (!inherits(json, "error")) + return(json) + + jlerr <- json + + } + + # otherwise, fall back to the default JSON reader + json <- tryCatch(renv_json_read_default(file, text), error = identity) + if (!inherits(json, "error")) + return(json) + + # report an error + if (!is.null(jlerr)) + stop(jlerr) else - renv_json_read_default(file, text) + stop(json) } renv_json_read_jsonlite <- function(file = NULL, text = NULL) { - text <- paste(text %||% read(file), collapse = "\n") + text <- paste(text %||% readLines(file, warn = FALSE), collapse = "\n") jsonlite::fromJSON(txt = text, simplifyVector = FALSE) } - renv_json_read_default <- function(file = NULL, text = NULL) { + renv_json_read_patterns <- function() { - # find strings in the JSON - text <- paste(text %||% read(file), collapse = "\n") - pattern <- '["](?:(?:\\\\.)|(?:[^"\\\\]))*?["]' - locs <- gregexpr(pattern, text, perl = TRUE)[[1]] + list( - # if any are found, replace them with placeholders - replaced <- text - strings <- character() - replacements <- character() + # objects + list("{", "\t\n\tobject(\t\n\t", TRUE), + list("}", "\t\n\t)\t\n\t", TRUE), - if (!identical(c(locs), -1L)) { + # arrays + list("[", "\t\n\tarray(\t\n\t", TRUE), + list("]", "\n\t\n)\n\t\n", TRUE), - # get the string values - starts <- locs - ends <- locs + attr(locs, "match.length") - 1L - strings <- substring(text, starts, ends) + # maps + list(":", "\t\n\t=\t\n\t", TRUE), - # only keep those requiring escaping - strings <- grep("[[\\]{}:]", strings, perl = TRUE, value = TRUE) + # newlines + list("\\u000a", "\n", FALSE) - # compute replacements - replacements <- sprintf('"\032%i\032"', seq_along(strings)) + ) - # replace the strings - mapply(function(string, replacement) { - replaced <<- sub(string, replacement, replaced, fixed = TRUE) - }, strings, replacements) + } - } + renv_json_read_envir <- function() { - # transform the JSON into something the R parser understands - transformed <- replaced - transformed <- gsub("{}", "`names<-`(list(), character())", transformed, fixed = TRUE) - transformed <- gsub("[[{]", "list(", transformed, perl = TRUE) - transformed <- gsub("[]}]", ")", transformed, perl = TRUE) - transformed <- gsub(":", "=", transformed, fixed = TRUE) - text <- paste(transformed, collapse = "\n") + envir <- new.env(parent = emptyenv()) - # parse it - json <- parse(text = text, keep.source = FALSE, srcfile = NULL)[[1L]] + envir[["+"]] <- `+` + envir[["-"]] <- `-` - # construct map between source strings, replaced strings - map <- as.character(parse(text = strings)) - names(map) <- as.character(parse(text = replacements)) + envir[["object"]] <- function(...) { + result <- list(...) + names(result) <- as.character(names(result)) + result + } - # convert to list - map <- as.list(map) + envir[["array"]] <- list - # remap strings in object - remapped <- renv_json_remap(json, map) + envir[["true"]] <- TRUE + envir[["false"]] <- FALSE + envir[["null"]] <- NULL - # evaluate - eval(remapped, envir = baseenv()) + envir } - renv_json_remap <- function(json, map) { + renv_json_read_remap <- function(object, patterns) { - # fix names - if (!is.null(names(json))) { - lhs <- match(names(json), names(map), nomatch = 0L) - rhs <- match(names(map), names(json), nomatch = 0L) - names(json)[rhs] <- map[lhs] - } + # repair names if necessary + if (!is.null(names(object))) { + + nms <- names(object) + for (pattern in patterns) + nms <- gsub(pattern[[2L]], pattern[[1L]], nms, fixed = TRUE) + names(object) <- nms - # fix values - if (is.character(json)) - return(map[[json]] %||% json) - - # handle true, false, null - if (is.name(json)) { - text <- as.character(json) - if (text == "true") - return(TRUE) - else if (text == "false") - return(FALSE) - else if (text == "null") - return(NULL) } - # recurse - if (is.recursive(json)) { - for (i in seq_along(json)) { - json[i] <- list(renv_json_remap(json[[i]], map)) - } + # repair strings if necessary + if (is.character(object)) { + for (pattern in patterns) + object <- gsub(pattern[[2L]], pattern[[1L]], object, fixed = TRUE) } - json + # recurse for other objects + if (is.recursive(object)) + for (i in seq_along(object)) + object[i] <- list(renv_json_read_remap(object[[i]], patterns)) + + # return remapped object + object } + + renv_json_read_default <- function(file = NULL, text = NULL) { + + # read json text + text <- paste(text %||% readLines(file, warn = FALSE), collapse = "\n") + + # convert into something the R parser will understand + patterns <- renv_json_read_patterns() + transformed <- text + for (pattern in patterns) + transformed <- gsub(pattern[[1L]], pattern[[2L]], transformed, fixed = TRUE) + + # parse it + rfile <- tempfile("renv-json-", fileext = ".R") + on.exit(unlink(rfile), add = TRUE) + writeLines(transformed, con = rfile) + json <- parse(rfile, keep.source = FALSE, srcfile = NULL)[[1L]] + + # evaluate in safe environment + result <- eval(json, envir = renv_json_read_envir()) + + # fix up strings if necessary -- do so only with reversible patterns + patterns <- Filter(function(pattern) pattern[[3L]], patterns) + renv_json_read_remap(result, patterns) + + } + # load the renv profile, if any renv_bootstrap_profile_load(project) @@ -960,35 +1326,9 @@ local({ # construct full libpath libpath <- file.path(root, prefix) - # attempt to load - if (renv_bootstrap_load(project, libpath, version)) - return(TRUE) - - # load failed; inform user we're about to bootstrap - prefix <- paste("# Bootstrapping renv", version) - postfix <- paste(rep.int("-", 77L - nchar(prefix)), collapse = "") - header <- paste(prefix, postfix) - message(header) - - # perform bootstrap - bootstrap(version, libpath) - - # exit early if we're just testing bootstrap - if (!is.na(Sys.getenv("RENV_BOOTSTRAP_INSTALL_ONLY", unset = NA))) - return(TRUE) - - # try again to load - if (requireNamespace("renv", lib.loc = libpath, quietly = TRUE)) { - message("* Successfully installed and loaded renv ", version, ".") - return(renv::load()) - } - - # failed to download or load renv; warn the user - msg <- c( - "Failed to find an renv installation: the project will not be loaded.", - "Use `renv::activate()` to re-initialize the project." - ) + # run bootstrap code + renv_bootstrap_exec(project, libpath, version) - warning(paste(msg, collapse = "\n"), call. = FALSE) + invisible() }) diff --git a/renv/settings.json b/renv/settings.json new file mode 100644 index 00000000..74c1d4bb --- /dev/null +++ b/renv/settings.json @@ -0,0 +1,19 @@ +{ + "bioconductor.version": null, + "external.libraries": [], + "ignored.packages": [], + "package.dependency.fields": [ + "Imports", + "Depends", + "LinkingTo" + ], + "ppm.enabled": null, + "ppm.ignored.urls": [], + "r.version": null, + "snapshot.type": "explicit", + "use.cache": true, + "vcs.ignore.cellar": true, + "vcs.ignore.library": true, + "vcs.ignore.local": true, + "vcs.manage.ignores": true +} diff --git a/tests/testthat/DESCRIPTION b/tests/testthat/DESCRIPTION new file mode 100644 index 00000000..ce63f074 --- /dev/null +++ b/tests/testthat/DESCRIPTION @@ -0,0 +1,88 @@ +Package: tidyCDISC +Title: Quick Table Generation & Exploratory Analyses on ADaM-Ish Datasets +Version: 0.2.1.9003 +Authors@R: c( + person("Aaron", "Clark", , "clark.aaronchris@gmail.com", role = c("aut", "cre"), + comment = c(ORCID = "0000-0002-0123-0970")), + person("Jeff", "Thompson", , "jeff.thompson51317@gmail.com", role = "aut"), + person("Teresa", "Wilson", , "teresadwilson@gmail.com", role = "aut"), + person("Nate", "Mockler", , "nate.mockler@biogen.com", role = c("ccp", "led")), + person("Maya", "Gans", , "maya.gans@biogen.com", role = "aut"), + person("Robert", "Krajcik", , "robert.krajcik@biogen.com", role = "ctb"), + person("Marly", "Gotti", , "marly.cormar@biogen.com", role = "ctb"), + person("Biogen", "Inc", role = "cph") + ) +Description: Provides users a quick exploratory dive into common + visualizations without writing a single line of code given the users + data follows the Analysis Data Model (ADaM) standards put forth by the + Clinical Data Interchange Standards Consortium (CDISC) + . Prominent modules/ features of the + application are the Table Generator, Population Explorer, and the + Individual Explorer. The Table Generator allows users to drag and drop + variables and desired statistics (frequencies, means, ANOVA, t-test, + and other summary statistics) into bins that automagically create + stunning tables with validated information. The Population Explorer + offers various plots to visualize general trends in the population + from various vantage points. Plot modules currently include scatter + plot, spaghetti plot, box plot, histogram, means plot, and bar plot. + Each plot type allows the user to plot uploaded variables against one + another, and dissect the population by filtering out certain subjects. + Last, the Individual Explorer establishes a cohesive patient + narrative, allowing the user to interact with patient metrics (params) + by visit or plotting important patient events on a timeline. All + modules allow for concise filtering & downloading bulk outputs into + html or pdf formats to save for later. +License: AGPL (>= 3) +URL: https://github.com/Biogen-Inc/tidyCDISC/, https://Biogen-Inc.github.io/tidyCDISC/ +BugReports: https://github.com/Biogen-Inc/tidyCDISC/issues +Depends: + R (>= 3.5) +Imports: + arrow, + broom.helpers, + cicerone, + cli, + config, + dplyr, + DT, + fs, + GGally, + ggcorrplot, + ggplot2, + ggsurvfit, + glue, + golem, + gt, + gtsummary, + haven, + IDEAFilter, + pkgload, + plotly, + purrr, + readxl, + rlang, + rmarkdown, + shiny, + shinyjs, + shinyWidgets, + sjlabelled, + stringr, + survival, + tibble, + tidyr, + tidyselect, + timevis, + tippy (== 0.1.0), + vroom +Suggests: + devtools, + knitr, + shinyalert, + spelling, + testthat +VignetteBuilder: + knitr +Encoding: UTF-8 +Language: en-US +LazyData: true +RoxygenNote: 7.3.2 diff --git a/tests/testthat/test-mod_popExp_km.R b/tests/testthat/test-mod_popExp_km.R new file mode 100644 index 00000000..45cc533a --- /dev/null +++ b/tests/testthat/test-mod_popExp_km.R @@ -0,0 +1,8 @@ +test_that("Cox PH reference group changes HR", { + d <- dplyr::mutate(adtte, SEX = as.factor(SEX)) + fit_a <- survival::coxph(Surv(AVAL, CNSR) ~ SEX, data = d) + d$SEX <- relevel(d$SEX, ref = levels(d$SEX)[2]) + fit_b <- survival::coxph(Surv(AVAL, CNSR) ~ SEX, data = d) + expect_false(all(coef(fit_a) == coef(fit_b))) + expect_equal(unname(coef(fit_b)), unname((-1 * coef(fit_a)))) +})