diff --git a/inst/codec_shiny/DESCRIPTION b/inst/codec_shiny/DESCRIPTION
new file mode 100644
index 0000000..390d9f3
--- /dev/null
+++ b/inst/codec_shiny/DESCRIPTION
@@ -0,0 +1,32 @@
+type: package
+Title: CoDEC Shiny
+R.version: 4.4.1
+Imports:
+ biscale (>=1.0.0),
+ bslib (>=0.8.0),
+ cincy (>=1.1.0),
+ classInt (>=0.4-10),
+ codec (>=2.1.0),
+ cowplot (>=1.1.3),
+ devtools (>=2.4.5),
+ dplyr (>=1.1.4),
+ fr (>=0.5.1),
+ ggExtra (>=0.10.1),
+ ggiraph (>=0.8.10),
+ leaflet (>=2.2.2),
+ purrr (>=1.0.2),
+ sf (>=1.0-17),
+ shiny (>=1.9.1),
+ shinyjs (>=2.1.0),
+ shinyWidgets (>=0.8.7),
+ tibble (>=3.2.1),
+ tidyverse (>=2.0.0),
+ bslib (>=0.8.0),
+ devtools (>=2.4.5),
+ dpkg (>=0.5.1),
+ shiny (>=1.9.1),
+ stats (>=4.4.1),
+ desc (>=1.4.3),
+ renv (>=1.0.10),
+ tibble (>=3.2.1),
+ utils (>=4.4.1)
diff --git a/inst/codec_shiny/README.md b/inst/codec_shiny/README.md
index bfc54dc..43d823b 100644
--- a/inst/codec_shiny/README.md
+++ b/inst/codec_shiny/README.md
@@ -6,6 +6,6 @@ This is an R Shiny application designed for the interactive exploration of commu
Visit https://... to see the currently deployed version of this web application.
-## Deployment
+## Developing
-Build, test, and deploy the application using the `just` or using the scripts in the `justfile`
+Build and view the application with `just build_shiny` from the package root directory.
diff --git a/inst/codec_shiny/app.R b/inst/codec_shiny/app.R
index 5bc313c..457b64c 100644
--- a/inst/codec_shiny/app.R
+++ b/inst/codec_shiny/app.R
@@ -1,4 +1,9 @@
-library(codec)
+# if (tryCatch(read.dcf("../../DESCRIPTION")[1, "Package"] == "codec", finally = FALSE)) {
+# devtools::load_all()
+# } else {
+ library(codec)
+#}
+
library(fr)
library(shiny)
library(cincy)
@@ -10,77 +15,56 @@ library(cowplot)
library(ggExtra)
library(shinyWidgets)
library(leaflet)
-
-{
-codec_data_installed <-
- fs::path_package("codec") |>
- fs::path("codec_data") |>
- fs::dir_ls() |>
- fs::path_file()
-
-codec_data_geography <- cincy::tract_tigris_2010
-codec_data_geography_name <- names(codec_data_geography)[[1]]
-
-d_prep <-
- purrr::map(
- codec_data_installed,
- \(x) codec::codec_data(name = x, geography = codec_data_geography),
- .progress = "interpolating codec data"
- ) |>
- purrr::set_names(codec_data_installed)
-
+library(sf)
+library(codec)
-core_titles <-
- purrr::map(d_prep, as.list) |>
- purrr::map(\(x) purrr::pluck(x, "name")) |> #just use the core names here
- purrr::map(tibble::as_tibble) |>
- # purrr::map(\(x) replace_na(x, purrr::pluck(x, "name")))
- bind_rows() |>
- #tibble::add_row(value = "Hamilton County Drivetime", .after = 1) |> #hacky workaround to get drivetime in, give it a title
- rename(name = "value")# |>
- #mutate(core_name = codec_data_installed)
+dpkgs <-
+ list(
+ environmental_justice_index =
+ get_codec_dpkg("environmental_justice_index-v0.1.0") |>
+ select(-year),
+ hh_acs_measures =
+ get_codec_dpkg("hh_acs_measures-v0.0.1") |>
+ dplyr::left_join(cincy::tract_tigris_2020, by = "census_tract_id_2020") |>
+ st_as_sf() |>
+ interpolate(cincy::tract_tigris_2010) |>
+ st_drop_geometry() |>
+ tibble::as_tibble() |>
+ select(-year),
+ drivetime =
+ get_codec_dpkg("drivetime-v0.2.2") |>
+ select(-year),
+ landcover =
+ get_codec_dpkg("landcover-v0.1.0") |>
+ select(-year),
+ parcel =
+ get_codec_dpkg("parcel-v0.1.0") |>
+ select(-year) |>
+ rename(n_parcel_violations = "n_violations"),
+ traffic =
+ get_codec_dpkg("traffic-v0.1.2") |>
+ dplyr::left_join(cincy::tract_tigris_2020, by = "census_tract_id_2020") |>
+ st_as_sf() |>
+ interpolate(cincy::tract_tigris_2010) |>
+ st_drop_geometry() |>
+ tibble::as_tibble() |>
+ select(-year),
+ property_code_enforcements =
+ get_codec_dpkg("property_code_enforcements-v0.1.0") |>
+ slice_max(year, by = census_tract_id_2010) |>
+ slice_max(month, by = census_tract_id_2010) |>
+ select(-year, -month) |>
+ rename(n_property_violations = "n_violations")
+ )
-drop_na_cols <- function(df){
- select(df, \(x) !all(is.na(x)))
-}
+tracts_sf <- cincy::tract_tigris_2010
-schema_names <- d_prep |>
- purrr::map_df(\(x) as.data.frame(x), .id = "schema_name") |>
- select(-year, -census_tract_id_2010) |>
- group_by(schema_name) |>
- group_split() |>
- purrr::map(tibble::as_tibble) |>
- purrr::map(slice_head) |>
- purrr::map(\(x) drop_na_cols(x)) |>
- map(\(x) pivot_longer(x, cols = 2:last_col())) |>
- bind_rows() |>
- select(-value)
-
-md <-
- purrr::map(d_prep, as.list) |>
- purrr::map(\(x) purrr::pluck(x, "schema", "fields")) |>
- purrr::flatten() |>
- purrr::map(tibble::as_tibble) |>
- bind_rows() |>
- filter(!name == 'year' & !type == 'string') |>
- left_join(schema_names, by = 'name') |>
- mutate(title = coalesce(title, name),
- description = replace_na(description, "No description available"))
-
-d_prep$hh_acs_measures <- filter(as.data.frame(d_prep$hh_acs_measures), year == 2019)
-
-d_all <-
- d_prep |>
- purrr::map(tibble::as_tibble) |>
- purrr::map(select, -year) |>
- purrr::reduce(inner_join)
-
-d_all <-
- d_all |>
- left_join(cincy::tract_tigris_2010 , by = 'census_tract_id_2010') |>
- sf::st_as_sf() |>
- sf::st_transform(4326)
+d_all <-
+ purrr::reduce(dpkgs, dplyr::left_join, by = "census_tract_id_2010", .init = tracts_sf) |>
+ tibble::as_tibble() |>
+ st_as_sf() |>
+ st_transform(st_crs(4326))
codec_bi_pal <- c(
"1-1" = "#eddcc1",
@@ -94,868 +78,1057 @@ codec_bi_pal <- c(
"3-3" = "#2b3135"
)
-codec_bi_pal_2 <- tibble(
- "1-1" = "#eddcc1",
- "2-1" = "#d4aa92",
- "3-1" = "#bb7964",
- "1-2" = "#909992",
- "2-2" = "#81766f",
- "3-2" = "#71544c",
- "1-3" = "#375a66",
- "2-3" = "#31464d",
- "3-3" = "#2b3135"
-) |>
- gather("group", "fill") |>
- arrange(group)
+codec_bi_pal_2 <- tibble::tribble(
+ ~group, ~fill,
+ "1-1", "#eddcc1",
+ "2-1", "#d4aa92",
+ "3-1", "#bb7964",
+ "1-2", "#909992",
+ "2-2", "#81766f",
+ "3-2", "#71544c",
+ "1-3", "#375a66",
+ "2-3", "#31464d",
+ "3-3", "#2b3135"
+)
uni_colors <- c(codec_colors()[1], "#567D91", "#789BAC", "#9FBAC8", "#CCDCE3", "#F6EDDE")
-}
-
+## ----
+
+geography_selector <-
+ selectInput(
+ inputId = "sel_geo",
+ label =
+ actionBttn(
+ inputId = "geography_sel_label",
+ style = "simple",
+ size = "sm",
+ block = FALSE,
+ label = a("Geography", href = "https://geomarker.io/cincy/articles/geographies.html", target = "_blank")
+ ) |>
+ tagAppendAttributes(style = "color: #C28273; background-color: #FFFFFF;"),
+
+ choices = c(
+ "census tract" = "tract",
+ "ZCTA" = "zcta",
+ "neighborhood" = "neighborhood"
+ ),
+ selected = "tract",
+ width = "100%"
+ )
+
+selector_codec_dpkgs <-
+ selectInput(
+ inputId = "sel_dpkgs",
+ ## label = NULL,
+ label = "CoDEC Data Packages",
+ choices = setNames(names(dpkgs), c(
+ "Environmental Justice Index",
+ "Harmonized Historical ACS Measures",
+ "Drivetime",
+ "Landcover",
+ "Parcel",
+ "Traffic",
+ "Property Code Enforcements"
+ )),
+ selected = c("hh_acs_measures"),
+ multiple = TRUE,
+ selectize = TRUE
+ )
+button_help_bivariate <-
+ actionBttn("legend_modal",
+ style = "simple",
+ label = "Bivariate",
+ size = "sm",
+ block = FALSE,
+ icon = icon("question-circle")
+ ) |>
+ tagAppendAttributes(style = "color: #C28273; background-color: #FFFFFF;")
-##----
+switch_plots <-
+ selectInput("side_plot_selector",
+ label = "Focus",
+ choices = c("map" = "main_map", "scatterplot" = "main_scatterplot"),
+ selected = "main_map",
+ width = "25%"
+ )
+
+selector_view <-
+ selectInput(
+ inputId = "view_method",
+ label = button_help_bivariate,
+ choices = c("univariate" = "univariate", "bivariate" = "bivariate"),
+ selected = "bivariate",
+ width = "100%"
+ )
ex_card <- card(
- card_header("Bivariate Map",
- actionBttn('legend_modal',
- style = "material-circle",
- #color = "primary",
- label = NULL,
- size = 'xs',
- block = FALSE,
- icon = icon("question-circle")) |>
- tagAppendAttributes(style = "color: #C28273; background-color: #FFFFFF"),
-
- shinyWidgets::prettySwitch("big_plot",
- label = "Enlarge scatter plot",
- status = "primary") |>
- tagAppendAttributes(style = "float: right"),
- ),
+ card_header(
+ img(
+ src = "logo.svg",
+ width = "75px", height = "auto", style = "float: left; margin-right: 15px;"
+ ),
+ layout_column_wrap(width = 1/2,
+ height = 80,
+
+ p(
+ br(),
+ a("Community Data Explorer for Cincinnati", href = "https://geomarker.io/codec", target = "_blank"),
+ br(),
+ paste0("CoDEC version ", packageVersion("codec"))
+ ),
+
+ layout_column_wrap(width = 1/2,
+ height = 75,
+ geography_selector ,
+ selector_view
+ ) |> tagAppendAttributes(style = "float: right")
+ )
+),
layout_sidebar(
fillable = TRUE,
- sidebar =
+ sidebar =
sidebar(
- div(img(src = "logo.svg",
- width = "125px", height = "auto", style = "display: block; margin-left: auto; margin-right: auto;")),
- hr(),
- radioButtons(inputId = "sel_geo",
- label = strong("Select your", a("geographic unit:", href = "https://geomarker.io/cincy/articles/geographies.html", target = "_blank")),
- choiceNames = c("Census Tract", "Zip Code Tabulation Area", "Neighborhood"),
- choiceValues = c("tract", 'zcta', 'neighborhood'),
- selected = "tract"),
-
- checkboxGroupInput(inputId = "core",
- label = strong("Select the CoDEC cores you would like to include:"),
- choices = core_titles$name,
- selected = c("tract_indices", 'hamilton_landcover')),
- layout_column_wrap(
- width = 1/2,
- actionButton('select_all', label = "Select All", style = "fill", color = "primary"),
- actionButton('deselect_all', label = "Deselect All", style = "fill", color = "primary"),
- ),
- hr(),
+ selector_codec_dpkgs,
uiOutput("x_sel"),
uiOutput("y_sel"),
- shinyWidgets::prettySwitch("univariate_switch",
- label = "Univariate view",
- status = "primary") |>
- tagAppendAttributes(style = "float: right"),
- hr(),
- htmlOutput('x_desc'),
- hr(),
- htmlOutput('y_desc'),
- width = '18%'
+ switch_plots,
+ conditionalPanel(
+ condition = "input.side_plot_selector == 'main_map'",
+ girafeOutput("side_scatter")
),
- leafletOutput("map"),
- uiOutput("plot_panel")
+ conditionalPanel(
+ condition = "input.side_plot_selector == 'main_scatterplot'",
+ leafletOutput("side_map", height= "50vh")
+ ),
+ #uiOutput("sidebar_plot"),
+ width = "30%"
+ ),
+ #uiOutput("main_plot"),
+
+ conditionalPanel(
+ condition = "input.side_plot_selector == 'main_map'",
+ leafletOutput("big_map", height = "80vh")
+ ),
+ conditionalPanel(
+ condition = "input.side_plot_selector == 'main_scatterplot'",
+ girafeOutput("big_scatter", height = "78%", width = "78%")
+ ),
+ uiOutput("clear_button_panel")
+
)
)
ui <- page_fillable(
- theme = bs_theme(version = 5,
- "bg" = "#FFFFFF",
- "fg" = "#396175",
- "primary" = "#C28273",
- "grid-gutter-width" = "0.0rem",
- "border-radius" = "0.5rem",
- "btn-border-radius" = "0.25rem" ),
-
+ theme = bs_theme(
+ version = 5,
+ "bg" = "#FFFFFF",
+ "fg" = "#396175",
+ "primary" = "#C28273",
+ "grid-gutter-width" = "0.0rem",
+ "border-radius" = "0.5rem",
+ "btn-border-radius" = "0.25rem"
+ ),
tags$head(
- tags$style(type="text/css", "text {font-family: sans-serif}")),
-
+ tags$style(type = "text/css", "text {font-family: sans-serif}")
+ ),
shinyjs::useShinyjs(),
-
ex_card
)
server <- function(input, output, session) {
-
d <- reactive({
-
- if (input$sel_geo == 'tract') {
- geo_option <- cincy::tract_tigris_2010
- } else if (input$sel_geo == 'zcta') {
- geo_option <- cincy::zcta_tigris_2010
+ if (input$sel_geo == "zcta") {
+ d <- d_all |>
+ cincy::interpolate(to = cincy::zcta_tigris_2010)
+ } else if (input$sel_geo == "neighborhood") {
+ d <- d_all |>
+ cincy::interpolate(to = cincy::neigh_cchmc_2010)
} else {
- geo_option <- cincy::neigh_cchmc_2010
+ d <- d_all
}
-
-
- temp <-
- purrr::map(
- codec_data_installed,
- \(x) codec::codec_data(name = x, geography = geo_option),
- .progress = "interpolating codec data"
- ) |>
- purrr::set_names(codec_data_installed)
-
- if(input$sel_geo == 'tract') {
- temp$hh_acs_measures <- filter(as.data.frame(temp$hh_acs_measures), year == 2019)
- }
-
- d <-
- temp |>
- purrr::map(tibble::as_tibble) |>
- purrr::map(select, -year) |>
- purrr::reduce(inner_join)
-
- if (input$sel_geo == 'tract') {
- d <- d |> left_join(cincy::tract_tigris_2010)
- } else if (input$sel_geo == 'zcta') {
- d <- d |> left_join(cincy::zcta_tigris_2010)
- } else {
- d <- d |> left_join(cincy::neigh_cchmc_2010)
- }
-
- colnames(d)[1] <- 'geo_index'
-
- d <-
- d |>
- sf::st_as_sf() |>
+ d <-
+ d |>
+ dplyr::rename("geo_index" = 1) |>
+ sf::st_as_sf() |>
sf::st_transform(crs = sf::st_crs(d_all))
-
-
})
-
- observeEvent(input$univariate_switch, {
-
- if (input$univariate_switch == T) {
- shinyjs::disable('y_sel')
- shinyjs::hide(id = 'y_desc')
+
+ observeEvent(input$view_method, {
+ if (input$view_method == "univariate") {
+ shinyjs::disable("y_sel")
} else {
- shinyjs::enable('y_sel')
- shinyjs::show('y_desc')
+ shinyjs::enable("y_sel")
}
-
})
-
-
- d_sel_cores <- reactive({
-
- core_titles |>
- filter(name %in% input$core)
-
+
+
+ d_sel_dpkgs <- reactive({
+ dpkgs[input$sel_dpkgs]
})
-
- d_sel_metrics <- reactive({
-
- md |>
- filter(schema_name %in% d_sel_cores()$name)
-
+
+ d_avail_vars <- reactive({
+ if (is.null(input$sel_dpkgs)) {
+ sendSweetAlert(
+ session = session,
+ title = "No Selection",
+ text = "Please select at least one data package",
+ type = "warning"
+ )
+ } else {
+ vars <- unlist(purrr::map(d_sel_dpkgs(), colnames))
+
+ vars <- vars[!vars %in% c("census_tract_id_2010", "year")]
+
+ named_vars <- set_names(vars, str_to_title(str_replace_all(vars, "_", " ")))
+
+ d_avail_vars <- named_vars
+ }
})
-
-
-
+
+
output$x_sel <- renderUI({
- shinyWidgets::pickerInput(inputId = 'x',
- label = "X Variable",
- choices = d_sel_metrics()$title,
- multiple = FALSE,
- selected = 'Percent Greenspace 2019',
- options = pickerOptions(
- liveSearch = TRUE
- ))
-
+
+ shinyWidgets::pickerInput(
+ inputId = "x",
+ label = "X: ",
+ choices = d_avail_vars(),
+ multiple = FALSE,
+ inline = TRUE,
+ width = "fit",
+ selected = "prcnt_poverty",
+ options = pickerOptions(
+ liveSearch = TRUE
+ )
+ )
})
-
+
output$y_sel <- renderUI({
- shinyWidgets::pickerInput(inputId = 'y',
- label = "Y Variable",
- choices = d_sel_metrics()$title,
- multiple = FALSE,
- selected = 'Material Deprivation Index',
- options = pickerOptions(
- liveSearch = TRUE
- ))
- })
-
-
-
- xvar <- reactive({
- req(input$x)
-
- xvar <- md |>
- filter(title == input$x) |>
- pull(name)
-
- xvar
-
- })
-
- yvar <- reactive({
- req(input$y)
-
- yvar <- md |>
- filter(title == input$y) |>
- pull(name)
-
- yvar
-
- })
-
- output$x_desc <- renderText({
- req(input$x)
-
- paste0(strong(input$x), ": ", md |> filter(title == input$x) |> pull(description))
- })
-
- output$y_desc <- renderText({
- req(input$y)
-
- paste0(strong(input$y), ": ", md |> filter(title == input$y) |> pull(description))
+
+ shinyWidgets::pickerInput(
+ inputId = "y",
+ label = "Y: ",
+ choices = d_avail_vars(),
+ multiple = FALSE,
+ inline = TRUE,
+ width = "fit",
+ selected = "median_home_value",
+ options = pickerOptions(
+ liveSearch = TRUE
+ )
+ )
})
-
+
observeEvent(input$select_all, {
- updateCheckboxGroupInput(inputId = 'core', selected = core_titles$title)
-
+ updateCheckboxGroupInput(inputId = "sel_dpkgs", selected = names(dpkgs))
})
-
-
+
+
observeEvent(input$deselect_all, {
-
- updateCheckboxGroupInput(inputId = 'core', selected = "")
-
+ updateCheckboxGroupInput(inputId = "sel_dpkgs", selected = "")
})
- output$map <- renderLeaflet({
-
-
+
+ map_ready <- renderLeaflet({
req(input$x)
-
- if (input$univariate_switch == F) {
-
-
- bins_x <- pull(d(), xvar())
- bins_y <- pull(d(), yvar())
-
+
+ if (input$view_method == "bivariate") {
+ bins_x <- pull(d(), input$x)
+ bins_y <- pull(d(), input$y)
+
bins_x <- classInt::classIntervals(bins_x, n = 3, style = "quantile")
bins_y <- classInt::classIntervals(bins_y, n = 3, style = "quantile")
-
+
bins_x <- bins_x$brks
bins_y <- bins_y$brks
-
+
+
# cut into groups defined above
- out <- d() |>
- mutate(bi_x = cut(get(xvar()), breaks = bins_x, include.lowest = TRUE))
- out <- out |>
- mutate(bi_y = cut(get(yvar()), breaks = bins_y, include.lowest = TRUE))
- out <- out|>
+ out <- d() |>
+ mutate(bi_x = cut(get(input$x), breaks = bins_x, include.lowest = TRUE))
+ out <- out |>
+ mutate(bi_y = cut(get(input$y), breaks = bins_y, include.lowest = TRUE))
+ out <- out |>
mutate(bi_class = paste0(as.numeric(bi_x), "-", as.numeric(bi_y)))
-
- out <- out |>
- mutate(out_lab = paste(geo_index, "
",
- xvar(), ": ", round(get(xvar()),2), "
",
- yvar(), ": ", round(get(yvar()),2)))
-
- pal <- colorFactor(codec_bi_pal, factor(out$bi_class, levels = c("1-1","2-1","3-1",
- "1-2","2-2","3-2",
- "1-3","2-3","3-3")))
-
- out <- sf::st_transform(out, crs = sf::st_crs(d_all))
-
- map <-
+
+ out <- out |>
+ mutate(out_lab = paste(
+ geo_index, "
",
+ input$x, ": ", round(get(input$x), 2), "
",
+ input$y, ": ", round(get(input$y), 2)
+ ))
+
+ pal <- colorFactor(codec_bi_pal, factor(out$bi_class, levels = c(
+ "1-1", "2-1", "3-1",
+ "1-2", "2-2", "3-2",
+ "1-3", "2-3", "3-3"
+ )))
+
+ out <- sf::st_transform(out, crs = sf::st_crs(d()))
+
+ map <-
leaflet(out) |>
- setView(-84.55, 39.18, zoom = 11.5) |>
+ setView(-84.55, 39.18, zoom = if (input$side_plot_selector == "main_map") {11.5} else {10}) |>
addProviderTiles(provider = providers$CartoDB.Positron) |>
- addPolygons(fillColor = ~pal(bi_class), fillOpacity = 0.7, stroke = T,
- label = ~lapply(out$out_lab, HTML),
- weight = .5, color = "#333333") |>
+ addPolygons(
+ fillColor = ~ pal(bi_class), fillOpacity = 0.7, stroke = T,
+ label = ~ lapply(out$out_lab, HTML),
+ weight = .5, color = "#333333"
+ ) |>
removeLayersControl()
-
- map
+
+ map
} else {
-
- bins_x <- pull(d(), xvar())
-
+ bins_x <- pull(d(), input$x)
+
bins_x <- classInt::classIntervals(bins_x, n = 6, style = "quantile")
-
+
bins_x <- bins_x$brks
-
+
# cut into groups defined above
- out <- d() |>
- mutate(bi_x = cut(get(xvar()), breaks = bins_x, include.lowest = TRUE)) |>
+ out <- d() |>
+ mutate(bi_x = cut(get(input$x), breaks = bins_x, include.lowest = TRUE)) |>
mutate(x_class = paste0(as.numeric(bi_x)))
-
- out <- out |>
- mutate(out_lab = paste(geo_index, "
",
- xvar(), ": ", round(get(xvar()),2)))
-
- pal <- colorFactor(uni_colors, factor(out$x_class, levels = c("1", "2", "3",
- "4", "5", "6")))
-
- out <- sf::st_transform(out, crs = sf::st_crs(d_all))
-
- map <-
- leaflet(out) |>
- setView(-84.55, 39.18, zoom = 11.5) |>
+
+ out <- out |>
+ mutate(out_lab = paste(
+ geo_index, "
",
+ input$x, ": ", round(get(input$x), 2)
+ ))
+
+ pal <- colorFactor(uni_colors, factor(out$x_class, levels = c(
+ "1", "2", "3",
+ "4", "5", "6"
+ )))
+
+ out <- sf::st_transform(out, crs = sf::st_crs(d()))
+
+ map <-
+ leaflet(out) |>
+ setView(-84.55, 39.18, zoom = if (input$side_plot_selector == "main_map") {11.5} else {10}) |>
addProviderTiles(provider = providers$CartoDB.Positron) |>
- addPolygons(fillColor = ~pal(x_class), fillOpacity = 0.7, stroke = T,
- label = ~lapply(out$out_lab, HTML),
- weight = .5, color = "#333333") |>
+ addPolygons(
+ fillColor = ~ pal(x_class), fillOpacity = 0.7, stroke = T,
+ label = ~ lapply(out$out_lab, HTML),
+ weight = .5, color = "#333333"
+ ) |>
removeLayersControl()
-
+
map
}
})
-
-
-
- output$scatter <- renderGirafe({
+
+
+
+ scatter_ready <- renderGirafe({
req(input$x)
-
- if (input$univariate_switch == F) {
-
-
- bins_x <- pull(d(), xvar())
- bins_y <- pull(d(), yvar())
+
+ if (input$view_method == "bivariate") {
+ bins_x <- pull(d(), input$x)
+ bins_y <- pull(d(), input$y)
+
bins_x <- classInt::classIntervals(bins_x, n = 3, style = "quantile")
bins_y <- classInt::classIntervals(bins_y, n = 3, style = "quantile")
-
+
bins_x <- bins_x$brks
bins_y <- bins_y$brks
-
+
# cut into groups defined above
- out_scat <- d() |>
- mutate(bi_x = cut(get(xvar()), breaks = bins_x, include.lowest = TRUE, labels = c("1", "2", "3")))
- out_scat <- out_scat |>
- mutate(bi_y = cut(get(yvar()), breaks = bins_y, include.lowest = TRUE, labels = c("1", "2", "3")))
- out_scat <- out_scat |>
+ out_scat <- d() |>
+ mutate(bi_x = cut(get(input$x), breaks = bins_x, include.lowest = TRUE, labels = c("1", "2", "3")))
+ out_scat <- out_scat |>
+ mutate(bi_y = cut(get(input$y), breaks = bins_y, include.lowest = TRUE, labels = c("1", "2", "3")))
+ out_scat <- out_scat |>
mutate(bi_class = paste0(as.numeric(bi_x), "-", as.numeric(bi_y)))
- scatter_panels <- ggplot(out_scat, aes_string(x = xvar(), y = yvar())) +
- annotate("rect",
- xmin = -Inf, xmax = bins_x[2],
- ymin = -Inf, ymax = bins_y[2],
- alpha = 1,
- fill = codec_bi_pal_2$fill[1]) +
- annotate("rect",
- xmin = -Inf, xmax = bins_x[2],
- ymin = bins_y[2], ymax = bins_y[3],
- alpha = 1,
- fill = codec_bi_pal_2$fill[2]) +
- annotate("rect",
- xmin = -Inf, xmax = bins_x[2],
- ymin = bins_y[3], ymax = Inf,
- alpha = 1,
- fill = codec_bi_pal_2$fill[3]) +
- annotate("rect",
- xmin = bins_x[2], xmax = bins_x[3],
- ymin = -Inf, ymax = bins_y[2],
- alpha = 1,
- fill = codec_bi_pal_2$fill[4]) +
- annotate("rect",
- xmin = bins_x[2], xmax = bins_x[3],
- ymin = bins_y[2], ymax = bins_y[3],
- alpha = 1,
- fill = codec_bi_pal_2$fill[5]) +
- annotate("rect",
- xmin = bins_x[2], xmax = bins_x[3],
- ymin = bins_y[3], ymax = Inf,
- alpha = 1,
- fill = codec_bi_pal_2$fill[6]) +
- annotate("rect",
- xmin = bins_x[3], xmax = Inf,
- ymin = -Inf, ymax = bins_y[2],
- alpha = 1,
- fill = codec_bi_pal_2$fill[7]) +
- annotate("rect",
- xmin = bins_x[3], xmax = Inf,
- ymin = bins_y[2], ymax = bins_y[3],
- alpha = 1,
- fill = codec_bi_pal_2$fill[8]) +
- annotate("rect",
- xmin = bins_x[3], xmax = Inf,
- ymin = bins_y[3], ymax = Inf,
- alpha = 1,
- fill = codec_bi_pal_2$fill[9])
-
-
+ scatter_panels <- ggplot(out_scat, aes_string(x = x, y= y))+#$x, y = input$y)) +
+ annotate("rect",
+ xmin = -Inf, xmax = bins_x[2],
+ ymin = -Inf, ymax = bins_y[2],
+ alpha = 1,
+ fill = codec_bi_pal[1]
+ ) +
+ annotate("rect",
+ xmin = -Inf, xmax = bins_x[2],
+ ymin = bins_y[2], ymax = bins_y[3],
+ alpha = 1,
+ fill = codec_bi_pal[4]
+ ) +
+ annotate("rect",
+ xmin = -Inf, xmax = bins_x[2],
+ ymin = bins_y[3], ymax = Inf,
+ alpha = 1,
+ fill = codec_bi_pal[7]
+ ) +
+ annotate("rect",
+ xmin = bins_x[2], xmax = bins_x[3],
+ ymin = -Inf, ymax = bins_y[2],
+ alpha = 1,
+ fill = codec_bi_pal[2]
+ ) +
+ annotate("rect",
+ xmin = bins_x[2], xmax = bins_x[3],
+ ymin = bins_y[2], ymax = bins_y[3],
+ alpha = 1,
+ fill = codec_bi_pal[5]
+ ) +
+ annotate("rect",
+ xmin = bins_x[2], xmax = bins_x[3],
+ ymin = bins_y[3], ymax = Inf,
+ alpha = 1,
+ fill = codec_bi_pal[8]
+ ) +
+ annotate("rect",
+ xmin = bins_x[3], xmax = Inf,
+ ymin = -Inf, ymax = bins_y[2],
+ alpha = 1,
+ fill = codec_bi_pal[3]
+ ) +
+ annotate("rect",
+ xmin = bins_x[3], xmax = Inf,
+ ymin = bins_y[2], ymax = bins_y[3],
+ alpha = 1,
+ fill = codec_bi_pal[6]
+ ) +
+ annotate("rect",
+ xmin = bins_x[3], xmax = Inf,
+ ymin = bins_y[3], ymax = Inf,
+ alpha = 1,
+ fill = codec_bi_pal[9]
+ )
+
+
scat <- scatter_panels +
- geom_point_interactive(data = d(), aes_string(x = xvar(), y = yvar(),
- data_id = "geo_index"),
- fill = codec_colors()[7],
- alpha = .8,
- shape = 21,
- color = "grey20",
- stroke = .5) +
+ geom_point_interactive(
+ data = d(), aes_string(
+ x = input$x, y = input$y,
+ data_id = "geo_index"
+ ),
+ fill = codec_colors()[7],
+ alpha = .8,
+ shape = 21,
+ color = "grey20",
+ stroke = .5
+ ) +
theme_light() +
- theme(aspect.ratio = 1, title = element_text(size = 8),
- axis.title = element_text(size = if (input$big_plot == FALSE) {6} else {10}),
- legend.key.size = unit(3,"mm")) +
- labs(x = paste0(input$x), y = paste0(input$y))
-
+ theme(
+ aspect.ratio = 1, title = element_text(size = 8),
+ axis.title = element_text(size = if (input$side_plot_selector == "main_map") {
+ 6
+ } else {
+ 10
+ }),
+ legend.key.size = unit(3, "mm")
+ ) +labs(x = paste0(input$x), y = paste0(input$y))
+
hist1 <- ggplot(d()) +
- geom_histogram_interactive(aes_string(x = xvar(), tooltip = "geo_index",
- data_id = "geo_index"),
- fill = codec_colors()[2], bins = 20, color = codec_colors()[3]) +
+ geom_histogram_interactive(
+ aes_string(
+ x = input$x, tooltip = "geo_index",
+ data_id = "geo_index"
+ ),
+ fill = codec_colors()[2], bins = 20, color = codec_colors()[3]
+ ) +
theme_minimal()
-
+
hist2 <- ggplot(d()) +
- geom_histogram_interactive(aes_string(x = yvar(), tooltip = "geo_index",
- data_id = "geo_index"),
- fill = codec_colors()[2], bins = 20, color = codec_colors()[3]) +
- coord_flip() +
+ geom_histogram_interactive(
+ aes_string(
+ x = input$y, tooltip = "geo_index",
+ data_id = "geo_index"
+ ),
+ fill = codec_colors()[2], bins = 20, color = codec_colors()[3]
+ ) +
+ coord_flip() +
theme_minimal()
-
+
scat1 <- insert_xaxis_grob(scat, hist1, position = "bottom")
scat2 <- insert_yaxis_grob(scat1, hist2, position = "right")
-
+
finalScat <- ggdraw() +
- draw_plot(scat2) + #, 0, 0, 1, 1, vjust = -.2)
- theme(plot.margin = margin(0,0,0,0))#
-
- gir_join <- girafe(ggobj = finalScat,
- width_svg = if (input$big_plot == FALSE) {3} else {6},
- height_svg = if (input$big_plot == FALSE) {3} else {6},
- options = list(opts_sizing(width = 1, rescale = T),
- opts_selection(type = "single")))
-
+ draw_plot(scat2) + # , 0, 0, 1, 1, vjust = -.2)
+ theme(plot.margin = margin(0, 0, 0, 0)) #
+
+ gir_join <- girafe(
+ ggobj = finalScat,
+ width_svg = if (input$side_plot_selector == "main_map") {
+ 3
+ } else {
+ 6
+ },
+ height_svg = if (input$side_plot_selector == "main_map") {
+ 3
+ } else {
+ 6
+ },
+ options = list(
+ opts_sizing(width = 1, rescale = T),
+ opts_selection(type = "single")
+ )
+ )
+
gir_join
} else {
- bins_x <- pull(d(), xvar())
-
+ bins_x <- pull(d(), input$x)
+
bins_x <- classInt::classIntervals(bins_x, n = 6, style = "quantile")
-
+
bins_x <- bins_x$brks
-
+
# cut into groups defined above
- out_scat <- d() |>
- mutate(bi_x = cut(get(xvar()), breaks = bins_x, include.lowest = TRUE)) |>
+ out_scat <- d() |>
+ mutate(bi_x = cut(get(input$x), breaks = bins_x, include.lowest = TRUE)) |>
mutate(x_class = paste0(as.numeric(bi_x)))
-
- scatter_panels <- ggplot(out_scat, aes_string(x = xvar())) +
- annotate("rect",
- xmin = -Inf, xmax = bins_x[2],
- ymin = -Inf, ymax = Inf,
- alpha = 1,
- fill = codec_colors()[1]) +
- annotate("rect",
- xmin = bins_x[2], xmax = bins_x[3],
- ymin = -Inf, ymax = Inf,
- alpha = 1,
- fill = "#567D91") +
- annotate("rect",
- xmin = bins_x[3], xmax = bins_x[4],
- ymin = -Inf, ymax = Inf,
- alpha = 1,
- fill = "#789BAC") +
- annotate("rect",
- xmin = bins_x[4], xmax = bins_x[5],
- ymin = -Inf, ymax = Inf,
- alpha = 1,
- fill = "#9FBAC8") +
- annotate("rect",
- xmin = bins_x[5], xmax = bins_x[6],
- ymin = -Inf, ymax = Inf,
- alpha = 1,
- fill = "#CCDCE3") +
- annotate("rect",
- xmin = bins_x[6], xmax = Inf,
- ymin = -Inf, ymax = Inf,
- alpha = 1,
- fill = "#F6EDDE")
-
+
+ scatter_panels <- ggplot(out_scat, aes_string(x = input$x)) +
+ annotate("rect",
+ xmin = -Inf, xmax = bins_x[2],
+ ymin = -Inf, ymax = Inf,
+ alpha = 1,
+ fill = codec_colors()[1]
+ ) +
+ annotate("rect",
+ xmin = bins_x[2], xmax = bins_x[3],
+ ymin = -Inf, ymax = Inf,
+ alpha = 1,
+ fill = "#567D91"
+ ) +
+ annotate("rect",
+ xmin = bins_x[3], xmax = bins_x[4],
+ ymin = -Inf, ymax = Inf,
+ alpha = 1,
+ fill = "#789BAC"
+ ) +
+ annotate("rect",
+ xmin = bins_x[4], xmax = bins_x[5],
+ ymin = -Inf, ymax = Inf,
+ alpha = 1,
+ fill = "#9FBAC8"
+ ) +
+ annotate("rect",
+ xmin = bins_x[5], xmax = bins_x[6],
+ ymin = -Inf, ymax = Inf,
+ alpha = 1,
+ fill = "#CCDCE3"
+ ) +
+ annotate("rect",
+ xmin = bins_x[6], xmax = Inf,
+ ymin = -Inf, ymax = Inf,
+ alpha = 1,
+ fill = "#F6EDDE"
+ )
+
scat <- scatter_panels +
- geom_histogram_interactive(d(), mapping = aes_string(x = xvar(), tooltip = "geo_index",
- data_id = "geo_index"),
- bins = 20,
- alpha = .6,
- fill = "grey70",
- color = "grey50") +
+ geom_histogram_interactive(d(),
+ mapping = aes_string(
+ x = input$x, tooltip = "geo_index",
+ data_id = "geo_index"
+ ),
+ bins = 20,
+ alpha = .6,
+ fill = "grey70",
+ color = "grey50"
+ ) +
theme_light() +
- theme(aspect.ratio = 1, title = element_text(size = 8),
- axis.title = element_text(size = if (input$big_plot == FALSE) {6} else {10}),
- legend.key.size = unit(3,"mm")) +
- labs(x = paste0(input$x), y = "")
-
- gir_join <- girafe(ggobj = scat,
- width_svg = if (input$big_plot == FALSE) {3} else {6},
- height_svg = if (input$big_plot == FALSE) {3} else {6},
- options = list(opts_sizing(width = 1, rescale = T),
- opts_selection(type = "single")))
-
+ theme(
+ aspect.ratio = 1, title = element_text(size = 8),
+ axis.title = element_text(size = if (input$side_plot_selector == "main_map") {
+ 6
+ } else {
+ 10
+ }),
+ legend.key.size = unit(3, "mm")
+ ) +
+ labs(x = paste0(input$x), y = "")
+
+ gir_join <- girafe(
+ ggobj = scat,
+ width_svg = if (input$side_plot_selector == "main_map") {
+ 3
+ } else {
+ 6
+ },
+ height_svg = if (input$side_plot_selector == "main_map") {
+ 3
+ } else {
+ 6
+ },
+ options = list(
+ opts_sizing(width = 1, rescale = T),
+ opts_selection(type = "single")
+ )
+ )
+
gir_join
-
}
-
})
-
+
d_scat_click <- reactiveVal()
scat_click <- reactiveVal()
-
- observeEvent(input$scatter_selected, {
-
- if (input$univariate_switch == F) {
-
-
- scat_click <- c(input$scatter_selected)
-
- d_scat_click <- d() |>
- filter(geo_index == scat_click)
-
-
- bins_x <- pull(d(), xvar())
- bins_y <- pull(d(), yvar())
+ # listen_for_click <- reactive({
+ # list(input$side_scatter_selected, input$big_scatter_selected)
+ # })
+
+ observeEvent(ignoreInit = TRUE, list(input$side_scatter_selected, input$big_scatter_selected), {
+ if (input$view_method == "bivariate") {
+ if (input$side_plot_selector == "main_map") {
+ scat_click <- input$side_scatter_selected
+ } else {
+ scat_click <-input$big_scatter_selected
+ }
+
+ d_scat_click <- d() |>
+ filter(geo_index == scat_click)
+
+
+ bins_x <- pull(d(), input$x)
+ bins_y <- pull(d(), input$y)
+
bins_x <- classInt::classIntervals(bins_x, n = 3, style = "quantile")
bins_y <- classInt::classIntervals(bins_y, n = 3, style = "quantile")
-
+
bins_x <- bins_x$brks
bins_y <- bins_y$brks
-
+
# cut into groups defined above
- out <- d() |>
- mutate(bi_x = cut(get(xvar()), breaks = bins_x, include.lowest = TRUE))
- out <- out |>
- mutate(bi_y = cut(get(yvar()), breaks = bins_y, include.lowest = TRUE))
- out <- out|>
+ out <- d() |>
+ mutate(bi_x = cut(get(input$x), breaks = bins_x, include.lowest = TRUE))
+ out <- out |>
+ mutate(bi_y = cut(get(input$y), breaks = bins_y, include.lowest = TRUE))
+ out <- out |>
mutate(bi_class = paste0(as.numeric(bi_x), "-", as.numeric(bi_y)))
-
- out <- out |>
- mutate(out_lab = paste(geo_index, "
",
- xvar(), ": ", round(get(xvar()),2), "
",
- yvar(), ": ", round(get(yvar()),2)))
-
- pal <- colorFactor(codec_bi_pal, factor(out$bi_class, levels = c("1-1","2-1","3-1",
- "1-2","2-2","3-2",
- "1-3","2-3","3-3")))
-
- out <- sf::st_transform(out, crs = sf::st_crs(d_all))
- d_scat_click <- sf::st_transform(d_scat_click, crs = sf::st_crs(d_all))
-
- map <-
- leafletProxy("map", data = out) |>
- clearShapes() |>
- setView(-84.55, 39.18, zoom = 11.5) |>
+
+ out <- out |>
+ mutate(out_lab = paste(
+ geo_index, "
",
+ input$x, ": ", round(get(input$x), 2), "
",
+ input$y, ": ", round(get(input$y), 2)
+ ))
+
+ pal <- colorFactor(codec_bi_pal, factor(out$bi_class, levels = c(
+ "1-1", "2-1", "3-1",
+ "1-2", "2-2", "3-2",
+ "1-3", "2-3", "3-3"
+ )))
+
+ out <- sf::st_transform(out, crs = sf::st_crs(d()))
+ d_scat_click <- sf::st_transform(d_scat_click, crs = sf::st_crs(d()))
+
+ map <-
+ leafletProxy(mapId = if (input$side_plot_selector == "main_map") {"big_map"} else {"side_map"}, data = out) |>
+ clearShapes() |>
+ setView(-84.55, 39.18, zoom = if (input$side_plot_selector == "main_map") {11.5} else {10}) |>
addProviderTiles(provider = providers$CartoDB.Positron) |>
- addPolygons(fillColor = ~pal(bi_class), fillOpacity = 0.7, stroke = T,
- label = ~lapply(out$out_lab, HTML),
- weight = .5, color = "#333333") |>
- addPolygons(data = d_scat_click, color = "#FFF", stroke = T, weight = 5, opacity = 1) |>
+ addPolygons(
+ fillColor = ~ pal(bi_class), fillOpacity = 0.7, stroke = T,
+ label = ~ lapply(out$out_lab, HTML),
+ weight = .5, color = "#333333"
+ ) |>
+ addPolygons(data = d_scat_click, color = "#FFFFFF", stroke = T, weight = 5, opacity = 1) |>
removeLayersControl()
-
+
map
} else {
-
- scat_click <- c(input$scatter_selected)
-
- d_scat_click <- d() |>
- filter(geo_index == scat_click)
-
-
- bins_x <- pull(d(), xvar())
-
+ scat_click <- c(input$side_scatter_selected)
+
+ d_scat_click <- d() |>
+ filter(geo_index == scat_click)
+
+
+ bins_x <- pull(d(), input$x)
+
bins_x <- classInt::classIntervals(bins_x, n = 6, style = "quantile")
-
+
bins_x <- bins_x$brks
-
+
# cut into groups defined above
- out <- d() |>
- mutate(bi_x = cut(get(xvar()), breaks = bins_x, include.lowest = TRUE)) |>
+ out <- d() |>
+ mutate(bi_x = cut(get(input$x), breaks = bins_x, include.lowest = TRUE)) |>
mutate(x_class = paste0(as.numeric(bi_x)))
-
- out <- out |>
- mutate(out_lab = paste(geo_index, "
",
- xvar(), ": ", round(get(xvar()),2)))
-
-
-
- pal <- colorFactor(uni_colors, factor(out$x_class, levels = c("1", "2", "3",
- "4", "5", "6")))
-
+
+ out <- out |>
+ mutate(out_lab = paste(
+ geo_index, "
",
+ input$x, ": ", round(get(input$x), 2)
+ ))
+
+
+
+ pal <- colorFactor(uni_colors, factor(out$x_class, levels = c(
+ "1", "2", "3",
+ "4", "5", "6"
+ )))
+
out <- sf::st_transform(out, crs = sf::st_crs(d()))
d_scat_click <- sf::st_transform(d_scat_click, crs = sf::st_crs(d()))
-
- map <-
- leafletProxy("map", data = out) |>
- clearShapes() |>
- setView(-84.55, 39.18, zoom = 11.5) |>
+
+ map <-
+ leafletProxy(mapId = if (input$side_plot_selector == "main_map") {"big_map"} else {"side_map"}, data = out) |>
+ clearShapes() |>
+ setView(-84.55, 39.18, zoom = if (input$side_plot_selector == "main_map") {11.5} else {10}) |>
addProviderTiles(provider = providers$CartoDB.Positron) |>
- addPolygons(fillColor = ~pal(x_class), fillOpacity = 0.7, stroke = T,
- label = ~lapply(out$out_lab, HTML),
- weight = .5, color = "#333333") |>
- addPolygons(data = d_scat_click, color = "#FFF", stroke = T, weight = 5, opacity = 1) |>
+ addPolygons(
+ fillColor = ~ pal(x_class), fillOpacity = 0.7, stroke = T,
+ label = ~ lapply(out$out_lab, HTML),
+ weight = .5, color = "#333333"
+ ) |>
+ addPolygons(data = d_scat_click, color = "#FFFFFF", stroke = T, weight = 5, opacity = 1) |>
removeLayersControl()
-
+
map
}
-
})
-
+
d_selected <- reactiveVal()
- observeEvent(input$map_click, {
-
+ observeEvent(ignoreInit = TRUE, list(input$big_map_click, input$side_map_click), {
map_click <- reactiveVal()
- map_click <- input$map_shape_click
-
- click <- tibble(lng = map_click$lng, lat = map_click$lat) |>
- sf::st_as_sf(coords= c('lng', 'lat'), crs = sf::st_crs(d_all))
- d_selected <- d() |>
+ if (input$side_plot_selector == "main_map") {
+ map_click <- input$big_map_click
+ } else {
+ map_click <- input$side_map_click
+ }
+
+
+ click <- tibble(lng = map_click$lng, lat = map_click$lat) |>
+ sf::st_as_sf(coords = c("lng", "lat"), crs = sf::st_crs(d()))
+
+ d_selected <- d() |>
sf::st_join(click, left = FALSE)
- output$scatter <- renderGirafe({
+
+ scatter_ready <- renderGirafe({
req(input$x)
-
- if (input$univariate_switch == F) {
-
- bins_x <- pull(d(), xvar())
- bins_y <- pull(d(), yvar())
-
+
+ if (input$view_method == "bivariate") {
+ bins_x <- pull(d(), input$x)
+ bins_y <- pull(d(), input$y)
+
bins_x <- classInt::classIntervals(bins_x, n = 3, style = "quantile")
bins_y <- classInt::classIntervals(bins_y, n = 3, style = "quantile")
-
+
bins_x <- bins_x$brks
bins_y <- bins_y$brks
-
+
# cut into groups defined above
- out_scat <- d() |>
- mutate(bi_x = cut(get(xvar()), breaks = bins_x, include.lowest = TRUE, labels = c("1", "2", "3")))
- out_scat <- out_scat |>
- mutate(bi_y = cut(get(yvar()), breaks = bins_y, include.lowest = TRUE, labels = c("1", "2", "3")))
- out_scat <- out_scat |>
+ out_scat <- d() |>
+ mutate(bi_x = cut(get(input$x), breaks = bins_x, include.lowest = TRUE, labels = c("1", "2", "3")))
+ out_scat <- out_scat |>
+ mutate(bi_y = cut(get(input$y), breaks = bins_y, include.lowest = TRUE, labels = c("1", "2", "3")))
+ out_scat <- out_scat |>
mutate(bi_class = paste0(as.numeric(bi_x), "-", as.numeric(bi_y)))
-
- scatter_panels <- ggplot(out_scat, aes_string(x = xvar(), y = yvar())) +
- annotate("rect",
- xmin = -Inf, xmax = bins_x[2],
+
+ scatter_panels <- ggplot(out_scat, aes_string(x = x, y= y))+#$x, y = input$y)) +
+ annotate("rect",
+ xmin = -Inf, xmax = bins_x[2],
ymin = -Inf, ymax = bins_y[2],
alpha = 1,
- fill = codec_bi_pal_2$fill[1]) +
- annotate("rect",
- xmin = -Inf, xmax = bins_x[2],
+ fill = codec_bi_pal[1]
+ ) +
+ annotate("rect",
+ xmin = -Inf, xmax = bins_x[2],
ymin = bins_y[2], ymax = bins_y[3],
alpha = 1,
- fill = codec_bi_pal_2$fill[2]) +
- annotate("rect",
- xmin = -Inf, xmax = bins_x[2],
+ fill = codec_bi_pal[4]
+ ) +
+ annotate("rect",
+ xmin = -Inf, xmax = bins_x[2],
ymin = bins_y[3], ymax = Inf,
alpha = 1,
- fill = codec_bi_pal_2$fill[3]) +
- annotate("rect",
- xmin = bins_x[2], xmax = bins_x[3],
+ fill = codec_bi_pal[7]
+ ) +
+ annotate("rect",
+ xmin = bins_x[2], xmax = bins_x[3],
ymin = -Inf, ymax = bins_y[2],
alpha = 1,
- fill = codec_bi_pal_2$fill[4]) +
- annotate("rect",
- xmin = bins_x[2], xmax = bins_x[3],
+ fill = codec_bi_pal[2]
+ ) +
+ annotate("rect",
+ xmin = bins_x[2], xmax = bins_x[3],
ymin = bins_y[2], ymax = bins_y[3],
alpha = 1,
- fill = codec_bi_pal_2$fill[5]) +
- annotate("rect",
- xmin = bins_x[2], xmax = bins_x[3],
+ fill = codec_bi_pal[5]
+ ) +
+ annotate("rect",
+ xmin = bins_x[2], xmax = bins_x[3],
ymin = bins_y[3], ymax = Inf,
alpha = 1,
- fill = codec_bi_pal_2$fill[6]) +
- annotate("rect",
- xmin = bins_x[3], xmax = Inf,
+ fill = codec_bi_pal[8]
+ ) +
+ annotate("rect",
+ xmin = bins_x[3], xmax = Inf,
ymin = -Inf, ymax = bins_y[2],
alpha = 1,
- fill = codec_bi_pal_2$fill[7]) +
- annotate("rect",
- xmin = bins_x[3], xmax = Inf,
+ fill = codec_bi_pal[3]
+ ) +
+ annotate("rect",
+ xmin = bins_x[3], xmax = Inf,
ymin = bins_y[2], ymax = bins_y[3],
alpha = 1,
- fill = codec_bi_pal_2$fill[8]) +
- annotate("rect",
- xmin = bins_x[3], xmax = Inf,
+ fill = codec_bi_pal[6]
+ ) +
+ annotate("rect",
+ xmin = bins_x[3], xmax = Inf,
ymin = bins_y[3], ymax = Inf,
alpha = 1,
- fill = codec_bi_pal_2$fill[9])
-
+ fill = codec_bi_pal[9]
+ )
+
scat <- scatter_panels +
- geom_point_interactive(data = d(), aes_string(x = xvar(), y = yvar(),
- data_id = "geo_index"),
- fill = codec_colors()[7],
- alpha = .8,
- shape = 21,
- color = "grey20",
- stroke = .5) +
- geom_point_interactive(data = d_selected,
- aes_string(x = xvar(), y = yvar(),
- data_id = "geo_index"),
- # tooltip = paste0(
- # input$x, ": ", xvar(), "\n",
- # input$y, ": ", yvar()
- # )),
- color = codec_colors()[1], size = 3, alpha = .6) +
+ geom_point_interactive(
+ data = d(), aes_string(
+ x = input$x, y = input$y,
+ data_id = "geo_index"
+ ),
+ fill = codec_colors()[7],
+ alpha = .8,
+ shape = 21,
+ color = "grey20",
+ stroke = .5
+ ) +
+ geom_point_interactive(
+ data = d_selected,
+ aes_string(
+ x = input$x, y = input$y,
+ data_id = "geo_index"
+ ),
+ # tooltip = paste0(
+ # input$x, ": ", input$x, "\n",
+ # input$y, ": ", input$y
+ # )),
+ color = "#FFFFFF", size = 3, alpha = .6
+ ) +
theme_light() +
- theme(aspect.ratio = 1, title = element_text(size = 8),
- axis.title = element_text(size = if (input$big_plot == FALSE) {6} else {10}),
- legend.key.size = unit(3,"mm")) +
+ theme(
+ aspect.ratio = 1, title = element_text(size = 8),
+ axis.title = element_text(size = if (input$side_plot_selector == "main_map") {
+ 6
+ } else {
+ 10
+ }),
+ legend.key.size = unit(3, "mm")
+ ) +
labs(x = paste0(input$x), y = paste0(input$y))
-
+
hist1 <- ggplot(d()) +
- geom_histogram_interactive(aes_string(x = xvar(), tooltip = "geo_index",
- data_id = "geo_index"),
- fill = codec_colors()[2], bins = 20, color = codec_colors()[3]) +
+ geom_histogram_interactive(
+ aes_string(
+ x = input$x, tooltip = "geo_index",
+ data_id = "geo_index"
+ ),
+ fill = codec_colors()[2], bins = 20, color = codec_colors()[3]
+ ) +
theme_minimal()
-
+
hist2 <- ggplot(d()) +
- geom_histogram_interactive(aes_string(x = yvar(), tooltip = "geo_index",
- data_id = "geo_index"),
- fill = codec_colors()[2], bins = 20, color = codec_colors()[3]) +
+ geom_histogram_interactive(
+ aes_string(
+ x = input$y, tooltip = "geo_index",
+ data_id = "geo_index"
+ ),
+ fill = codec_colors()[2], bins = 20, color = codec_colors()[3]
+ ) +
coord_flip() +
theme_minimal()
-
+
scat1 <- insert_xaxis_grob(scat, hist1, position = "bottom")
scat2 <- insert_yaxis_grob(scat1, hist2, position = "right")
-
+
finalScat <- ggdraw() +
- draw_plot(scat2) + #, 0, 0, 1, 1, vjust = -.2)
- theme(plot.margin = margin(0,0,0,0))#
-
- gir_join <- girafe(ggobj = finalScat,
- width_svg = if (input$big_plot == FALSE) {3} else {6},
- height_svg = if (input$big_plot == FALSE) {3} else {6},
- options = list(opts_sizing(width = 1, rescale = T),
- opts_selection(type = "single")))
+ draw_plot(scat2) + # , 0, 0, 1, 1, vjust = -.2)
+ theme(plot.margin = margin(0, 0, 0, 0)) #
+
+ gir_join <- girafe(
+ ggobj = finalScat,
+ width_svg = if (input$side_plot_selector == "main_map") {
+ 3
+ } else {
+ 6
+ },
+ height_svg = if (input$side_plot_selector == "main_map") {
+ 3
+ } else {
+ 6
+ },
+ options = list(
+ opts_sizing(width = 1, rescale = T),
+ opts_selection(type = "single")
+ )
+ )
gir_join
-
} else {
-
- bins_x <- pull(d(), xvar())
-
+ bins_x <- pull(d(), input$x)
+
bins_x <- classInt::classIntervals(bins_x, n = 6, style = "quantile")
-
+
bins_x <- bins_x$brks
-
+
# cut into groups defined above
- out_scat <- d() |>
- mutate(bi_x = cut(get(xvar()), breaks = bins_x, include.lowest = TRUE)) |>
+ out_scat <- d() |>
+ mutate(bi_x = cut(get(input$x), breaks = bins_x, include.lowest = TRUE)) |>
mutate(x_class = paste0(as.numeric(bi_x)))
-
- scatter_panels <- ggplot(out_scat, aes_string(x = xvar())) +
- annotate("rect",
- xmin = -Inf, xmax = bins_x[2],
- ymin = -Inf, ymax = Inf,
- alpha = 1,
- fill = codec_colors()[1]) +
- annotate("rect",
- xmin = bins_x[2], xmax = bins_x[3],
- ymin = -Inf, ymax = Inf,
- alpha = 1,
- fill = "#567D91") +
- annotate("rect",
- xmin = bins_x[3], xmax = bins_x[4],
- ymin = -Inf, ymax = Inf,
- alpha = 1,
- fill = "#789BAC") +
- annotate("rect",
- xmin = bins_x[4], xmax = bins_x[5],
- ymin = -Inf, ymax = Inf,
- alpha = 1,
- fill = "#9FBAC8") +
- annotate("rect",
- xmin = bins_x[5], xmax = bins_x[6],
- ymin = -Inf, ymax = Inf,
- alpha = 1,
- fill = "#CCDCE3") +
- annotate("rect",
- xmin = bins_x[6], xmax = Inf,
- ymin = -Inf, ymax = Inf,
- alpha = 1,
- fill = "#F6EDDE")
-
+
+ scatter_panels <- ggplot(out_scat, aes_string(x = input$x)) +
+ annotate("rect",
+ xmin = -Inf, xmax = bins_x[2],
+ ymin = -Inf, ymax = Inf,
+ alpha = 1,
+ fill = codec_colors()[1]
+ ) +
+ annotate("rect",
+ xmin = bins_x[2], xmax = bins_x[3],
+ ymin = -Inf, ymax = Inf,
+ alpha = 1,
+ fill = "#567D91"
+ ) +
+ annotate("rect",
+ xmin = bins_x[3], xmax = bins_x[4],
+ ymin = -Inf, ymax = Inf,
+ alpha = 1,
+ fill = "#789BAC"
+ ) +
+ annotate("rect",
+ xmin = bins_x[4], xmax = bins_x[5],
+ ymin = -Inf, ymax = Inf,
+ alpha = 1,
+ fill = "#9FBAC8"
+ ) +
+ annotate("rect",
+ xmin = bins_x[5], xmax = bins_x[6],
+ ymin = -Inf, ymax = Inf,
+ alpha = 1,
+ fill = "#CCDCE3"
+ ) +
+ annotate("rect",
+ xmin = bins_x[6], xmax = Inf,
+ ymin = -Inf, ymax = Inf,
+ alpha = 1,
+ fill = "#F6EDDE"
+ )
+
scat <- scatter_panels +
- geom_histogram_interactive(d(), mapping = aes_string(x = xvar(), tooltip = "geo_index",
- data_id = "geo_index"),
- bins = 20,
- alpha = .6,
- fill = "grey70",
- color = "grey50") +
- geom_segment(d_selected,
- mapping = aes_string(
- x = xvar(),
- xend = xvar(),
- y = -1,
- yend = 0),
- arrow = arrow(length = unit(1, "mm"), type = "closed"),
- color = "black") +
+ geom_histogram_interactive(d(),
+ mapping = aes_string(
+ x = input$x, tooltip = "geo_index",
+ data_id = "geo_index"
+ ),
+ bins = 20,
+ alpha = .6,
+ fill = "grey70",
+ color = "grey50"
+ ) +
+ geom_segment(d_selected,
+ mapping = aes_string(
+ x = input$x,
+ xend = input$x,
+ y = -1,
+ yend = 0
+ ),
+ arrow = arrow(length = unit(1, "mm"), type = "closed"),
+ color = "black"
+ ) +
theme_light() +
- theme(aspect.ratio = 1, title = element_text(size = 8),
- axis.title = element_text(size = if (input$big_plot == FALSE) {6} else {10}),
- legend.key.size = unit(3,"mm")) +
- labs(x = paste0(input$x), y = "")
-
-
- gir_join <- girafe(ggobj = scat,
- width_svg = if (input$big_plot == FALSE) {3} else {6},
- height_svg = if (input$big_plot == FALSE) {3} else {6},
- options = list(opts_sizing(width = 1, rescale = T),
- opts_selection(type = "single")))
-
+ theme(
+ aspect.ratio = 1, title = element_text(size = 8),
+ axis.title = element_text(size = if (input$side_plot_selector == "main_map") {
+ 6
+ } else {
+ 10
+ }),
+ legend.key.size = unit(3, "mm")
+ ) +
+ labs(x = paste0(input$x), y = "")
+
+
+ gir_join <- girafe(
+ ggobj = scat,
+ width_svg = if (input$side_plot_selector == "main_map") {
+ 3
+ } else {
+ 6
+ },
+ height_svg = if (input$side_plot_selector == "main_map") {
+ 3
+ } else {
+ 6
+ },
+ options = list(
+ opts_sizing(width = 1, rescale = T),
+ opts_selection(type = "single")
+ )
+ )
+
gir_join
-
}
})
+ output$side_scatter <- reactive({scatter_ready()})
+
+ output$big_scatter <- reactive({scatter_ready()})
})
-
+
output$legend <- renderPlot({
-
- legend <- bi_legend(pal = codec_bi_pal,
- dim = 3,
- xlab = paste0("Higher X Variable"),
- ylab = paste0("Higher Y Variable"),
- size = 12)
-
+ legend <- bi_legend(
+ pal = codec_bi_pal,
+ dim = 3,
+ xlab = paste0("Higher X Variable"),
+ ylab = paste0("Higher Y Variable"),
+ size = 12
+ )
+
legend
})
- output$plot_panel <- renderUI({
- absolutePanel(id = "plot_panel",
- class = "panel panel-default",
- cursor = "auto",
- draggable = TRUE,
- top = 100,
- height = if (input$big_plot == FALSE) {"400px"} else { "900px"},
- right = 20,
- width = if (input$big_plot == FALSE) {"400px"} else { "1000px"},
- style =
- "padding: 5px;
+ output$side_scatter <- reactive({scatter_ready()})
+
+ output$big_scatter <- reactive({scatter_ready()})
+
+ output$side_map <- reactive({map_ready()})
+
+ output$big_map <- reactive({map_ready()})
+
+
+ output$clear_button_panel <- renderUI({
+ absolutePanel(
+ id = "clear_button_panel",
+ class = "panel panel-default",
+ cursor = "auto",
+ draggable = TRUE,
+ top = 50,
+ right = 20,
+ style =
+ "z-index: 10;
+ padding: 5px;
border: 1px solid #000;
background: #FFFFFF;
opacity: .9;
margin: auto;
border-radius: 5pt;
box-shadow: 0pt 0pt 6pt 0px rgba(61,59,61,0.48);",
- fixedRow(girafeOutput("scatter",
- height = if (input$big_plot == FALSE) {"350px"} else { "800px"},
- width = if (input$big_plot == FALSE) {"350px"} else { "800px"})))
-
+ fixedRow(
+ shinyWidgets::actionBttn("clear_map_selection",
+ label = "Reset",
+ size = "xs",
+ style = "simple",
+ status = "primary"
+ ) |>
+ tagAppendAttributes(style = "color: #FFFFFF; background-color: #396175;"),
+ )
+ )
})
+
observeEvent(input$legend_modal, {
showModal(
modalDialog(
@@ -966,11 +1139,32 @@ server <- function(input, output, session) {
)
)
})
+
+ observeEvent(input$clear_map_selection, {
+ map <-
+ leafletProxy(mapId = if (input$side_plot_selector == "main_map") {"big_map"} else {"side_map"}, data = d()) |>
+ clearShapes() |>
+ setView(-84.55, 39.18, zoom = 11.5) |>
+ addProviderTiles(provider = providers$CartoDB.Positron) |>
+ addPolygons(
+ fillColor = "#ffffff",
+ opacity = .4,
+ color = "#333333",
+ weight = .5
+ )
+
+ map
+
+ output$side_scatter <- reactive({scatter_ready()})
+
+ output$big_scatter <- reactive({scatter_ready()})
+ })
-
+ outputOptions(output, 'big_map', suspendWhenHidden=TRUE)
+ outputOptions(output, 'side_map', suspendWhenHidden=TRUE)
+ outputOptions(output, 'big_scatter', suspendWhenHidden=TRUE)
+ outputOptions(output, 'side_scatter', suspendWhenHidden=TRUE)
}
shinyApp(ui, server)
-
-
diff --git a/inst/codec_shiny/make_desc.R b/inst/codec_shiny/make_desc.R
new file mode 100644
index 0000000..5ba8a5b
--- /dev/null
+++ b/inst/codec_shiny/make_desc.R
@@ -0,0 +1,31 @@
+# to loosely document dependencies and versions
+# scan working directory for R code package dependencies
+# get installed versions of package from library
+# document in DESCRIPTION file
+
+dsc <- desc::desc(text = "")
+dsc$set(
+ type = "package",
+ Title = "CoDEC Shiny",
+ R.version = paste(getRversion(), sep = ".")
+)
+
+deps <-
+ tibble::tibble(
+ type = "Imports",
+ package = renv::dependencies(path = "inst/codec_shiny", quiet = TRUE)$Package,
+ version = lapply(package, \(.) utils::packageDescription(.)$Version)
+)
+deps$version <- paste0(">=", as.character(deps$version))
+dsc$set_deps(deps)
+
+dsc
+
+dsc$write(file = "inst/codec_shiny/DESCRIPTION")
+
+# to install project, run:
+# TODO this still doesn't work when in a subfolder of a package
+pak::local_install_dev_deps(root = "inst/codec_shiny", upgrade = FALSE)
+
+# to fully snapshot packages, point to DESCRIPTION file and specify explicit
+renv::snapshot(project = "inst/codec_shiny", type = "explicit")
diff --git a/inst/codec_shiny/manifest.json b/inst/codec_shiny/manifest.json
new file mode 100644
index 0000000..bbb8f14
--- /dev/null
+++ b/inst/codec_shiny/manifest.json
@@ -0,0 +1,5685 @@
+{
+ "version": 1,
+ "locale": "en_US",
+ "platform": "4.2.2",
+ "metadata": {
+ "appmode": "shiny",
+ "primary_rmd": null,
+ "primary_html": null,
+ "content_category": null,
+ "has_parameters": false
+ },
+ "packages": {
+ "BH": {
+ "Source": "CRAN",
+ "Repository": "https://cran.rstudio.com",
+ "description": {
+ "Package": "BH",
+ "Type": "Package",
+ "Title": "Boost C++ Header Files",
+ "Version": "1.78.0-0",
+ "Date": "2021-12-14",
+ "Author": "Dirk Eddelbuettel, John W. Emerson and Michael J. Kane",
+ "Maintainer": "Dirk Eddelbuettel ",
+ "Description": "Boost provides free peer-reviewed portable C++ source \n libraries. A large part of Boost is provided as C++ template code\n which is resolved entirely at compile-time without linking. This \n package aims to provide the most useful subset of Boost libraries \n for template use among CRAN packages. By placing these libraries in \n this package, we offer a more efficient distribution system for CRAN \n as replication of this code in the sources of other packages is \n avoided. As of release 1.78.0-0, the following Boost libraries are\n included: 'accumulators' 'algorithm' 'align' 'any' 'atomic' 'beast'\n 'bimap' 'bind' 'circular_buffer' 'compute' 'concept' 'config'\n 'container' 'date_time' 'detail' 'dynamic_bitset' 'exception'\n 'flyweight' 'foreach' 'functional' 'fusion' 'geometry' 'graph' 'heap'\n 'icl' 'integer' 'interprocess' 'intrusive' 'io' 'iostreams'\n 'iterator' 'lambda2' 'math' 'move' 'mp11' 'mpl' 'multiprecision'\n 'numeric' 'pending' 'phoenix' 'polygon' 'preprocessor' 'process'\n 'propery_tree' 'random' 'range' 'scope_exit' 'smart_ptr' 'sort'\n 'spirit' 'tuple' 'type_traits' 'typeof' 'unordered' 'utility' 'uuid'.",
+ "License": "BSL-1.0",
+ "URL": "https://github.com/eddelbuettel/bh,\nhttps://dirk.eddelbuettel.com/code/bh.html",
+ "BugReports": "https://github.com/eddelbuettel/bh/issues",
+ "NeedsCompilation": "no",
+ "Packaged": "2021-12-14 21:51:21 UTC; edd",
+ "Repository": "CRAN",
+ "Date/Publication": "2021-12-15 07:50:08 UTC",
+ "Built": "R 4.2.0; ; 2022-04-25 03:12:38 UTC; unix"
+ }
+ },
+ "DBI": {
+ "Source": "CRAN",
+ "Repository": "https://cran.rstudio.com",
+ "description": {
+ "Package": "DBI",
+ "Title": "R Database Interface",
+ "Version": "1.2.3",
+ "Date": "2024-06-02",
+ "Authors@R": "c(\n person(\"R Special Interest Group on Databases (R-SIG-DB)\", role = \"aut\"),\n person(\"Hadley\", \"Wickham\", role = \"aut\"),\n person(\"Kirill\", \"Müller\", , \"kirill@cynkra.com\", role = c(\"aut\", \"cre\"),\n comment = c(ORCID = \"0000-0002-1416-3412\")),\n person(\"R Consortium\", role = \"fnd\")\n )",
+ "Description": "A database interface definition for communication between R\n and relational database management systems. All classes in this\n package are virtual and need to be extended by the various R/DBMS\n implementations.",
+ "License": "LGPL (>= 2.1)",
+ "URL": "https://dbi.r-dbi.org, https://github.com/r-dbi/DBI",
+ "BugReports": "https://github.com/r-dbi/DBI/issues",
+ "Depends": "methods, R (>= 3.0.0)",
+ "Suggests": "arrow, blob, covr, DBItest, dbplyr, downlit, dplyr, glue,\nhms, knitr, magrittr, nanoarrow (>= 0.3.0.1), RMariaDB,\nrmarkdown, rprojroot, RSQLite (>= 1.1-2), testthat (>= 3.0.0),\nvctrs, xml2",
+ "VignetteBuilder": "knitr",
+ "Config/autostyle/scope": "line_breaks",
+ "Config/autostyle/strict": "false",
+ "Config/Needs/check": "r-dbi/DBItest",
+ "Encoding": "UTF-8",
+ "RoxygenNote": "7.3.1",
+ "Config/Needs/website": "r-dbi/DBItest, r-dbi/dbitemplate, adbi,\nAzureKusto, bigrquery, DatabaseConnector, dittodb, duckdb,\nimplyr, lazysf, odbc, pool, RAthena, IMSMWU/RClickhouse, RH2,\nRJDBC, RMariaDB, RMySQL, RPostgres, RPostgreSQL, RPresto,\nRSQLite, sergeant, sparklyr, withr",
+ "Config/testthat/edition": "3",
+ "NeedsCompilation": "no",
+ "Packaged": "2024-06-02 20:26:05 UTC; kirill",
+ "Author": "R Special Interest Group on Databases (R-SIG-DB) [aut],\n Hadley Wickham [aut],\n Kirill Müller [aut, cre] (),\n R Consortium [fnd]",
+ "Maintainer": "Kirill Müller ",
+ "Repository": "CRAN",
+ "Date/Publication": "2024-06-02 21:50:02 UTC",
+ "Built": "R 4.2.2; ; 2024-09-13 15:06:54 UTC; unix"
+ }
+ },
+ "KernSmooth": {
+ "Source": "CRAN",
+ "Repository": "https://cran.rstudio.com",
+ "description": {
+ "Package": "KernSmooth",
+ "Priority": "recommended",
+ "Version": "2.23-20",
+ "Date": "2021-05-03",
+ "Title": "Functions for Kernel Smoothing Supporting Wand & Jones (1995)",
+ "Authors@R": "c(person(\"Matt\", \"Wand\", role = \"aut\",\n\t email = \"Matt.Wand@uts.edu.au\"),\n\t person(\"Cleve\", \"Moler\", role = \"ctb\",\n\t comment = \"LINPACK routines in src/d*\"),\n person(\"Brian\", \"Ripley\", role = c(\"trl\", \"cre\", \"ctb\"),\n email = \"ripley@stats.ox.ac.uk\",\n\t\t comment = \"R port and updates\"))",
+ "Note": "Maintainers are not available to give advice on using a package\nthey did not author.",
+ "Depends": "R (>= 2.5.0), stats",
+ "Suggests": "MASS, carData",
+ "Description": "Functions for kernel smoothing (and density estimation)\n corresponding to the book: \n Wand, M.P. and Jones, M.C. (1995) \"Kernel Smoothing\".",
+ "License": "Unlimited",
+ "ByteCompile": "yes",
+ "NeedsCompilation": "yes",
+ "Packaged": "2021-05-03 08:46:19 UTC; ripley",
+ "Author": "Matt Wand [aut],\n Cleve Moler [ctb] (LINPACK routines in src/d*),\n Brian Ripley [trl, cre, ctb] (R port and updates)",
+ "Maintainer": "Brian Ripley ",
+ "Repository": "CRAN",
+ "Date/Publication": "2021-05-03 14:06:33 UTC",
+ "Built": "R 4.2.2; x86_64-apple-darwin17.0; 2022-10-31 22:33:21 UTC; unix"
+ }
+ },
+ "MASS": {
+ "Source": "CRAN",
+ "Repository": "https://cran.rstudio.com",
+ "description": {
+ "Package": "MASS",
+ "Priority": "recommended",
+ "Version": "7.3-58.1",
+ "Date": "2022-07-27",
+ "Revision": "$Rev: 3606 $",
+ "Depends": "R (>= 3.3.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 = \"ripley@stats.ox.ac.uk\"),\n\t person(\"Bill\", \"Venables\", role = \"ctb\"),\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\"))",
+ "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": "2022-07-27 05:37:13 UTC; ripley",
+ "Author": "Brian Ripley [aut, cre, cph],\n Bill Venables [ctb],\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]",
+ "Maintainer": "Brian Ripley ",
+ "Repository": "CRAN",
+ "Date/Publication": "2022-08-03 15:06:59 UTC",
+ "Built": "R 4.2.2; x86_64-apple-darwin17.0; 2022-10-31 22:33:21 UTC; unix"
+ }
+ },
+ "Matrix": {
+ "Source": "CRAN",
+ "Repository": "https://cran.rstudio.com",
+ "description": {
+ "Package": "Matrix",
+ "Version": "1.5-3",
+ "Date": "2022-11-09",
+ "Priority": "recommended",
+ "Title": "Sparse and Dense Matrix Classes and Methods",
+ "Contact": "Matrix-authors@R-project.org",
+ "Maintainer": "Martin Maechler ",
+ "Authors@R": "c(person(\"Douglas\", \"Bates\", role = \"aut\")\n , person(\"Martin\", \"Maechler\", role = c(\"aut\", \"cre\"),\n email = \"mmaechler+Matrix@gmail.com\",\n comment = c(ORCID = \"0000-0002-8685-9910\"))\n , person(\"Mikael\", \"Jagan\", role = \"aut\",\n comment = c(ORCID = \"0000-0002-3542-2938\"))\n , person(\"Timothy A.\", \"Davis\", role = \"ctb\",\n comment = c(\"SuiteSparse and 'cs' C libraries, notably CHOLMOD and AMD\",\n\t \"collaborators listed in dir(pattern=\\\"^[A-Z]+[.]txt$\\\", full.names=TRUE, system.file(\\\"doc\\\", \\\"SuiteSparse\\\", package=\\\"Matrix\\\"))\"))\n , person(\"Jens\", \"Oehlschlägel\", role = \"ctb\",\n comment = \"initial nearPD()\")\n , person(\"Jason\", \"Riedy\", role = \"ctb\",\n comment = c(\"condest() and onenormest() for octave\",\n \t \t \"Copyright: Regents of the University of California\"))\n , person(\"R Core Team\", role = \"ctb\",\n comment = \"base R matrix implementation\")\n )",
+ "Description": "A rich hierarchy of matrix classes, including triangular,\n symmetric, and diagonal matrices, both dense and sparse and with\n pattern, logical and numeric entries. Numerous methods for and\n operations on these matrices, using 'LAPACK' and 'SuiteSparse' libraries.",
+ "Depends": "R (>= 3.5.0), methods",
+ "Imports": "graphics, grid, lattice, stats, utils",
+ "Suggests": "expm, MASS",
+ "Enhances": "MatrixModels, graph, SparseM, sfsmisc, igraph, maptools, sp,\nspdep",
+ "EnhancesNote": "line 2: for \"Rd xrefs\"",
+ "Encoding": "UTF-8",
+ "LazyData": "no",
+ "LazyDataNote": "not possible, since we use data/*.R *and* our classes",
+ "BuildResaveData": "no",
+ "License": "GPL (>= 2) | file LICENCE",
+ "URL": "https://Matrix.R-forge.R-project.org/,\nhttps://Matrix.R-forge.R-project.org/doxygen/",
+ "BugReports": "https://R-forge.R-project.org/tracker/?atid=294&group_id=61",
+ "NeedsCompilation": "yes",
+ "Packaged": "2022-11-10 14:57:57 UTC; maechler",
+ "Author": "Douglas Bates [aut],\n Martin Maechler [aut, cre] (),\n Mikael Jagan [aut] (),\n Timothy A. Davis [ctb] (SuiteSparse and 'cs' C libraries, notably\n CHOLMOD and AMD, collaborators listed in\n dir(pattern=\"^[A-Z]+[.]txt$\", full.names=TRUE, system.file(\"doc\",\n \"SuiteSparse\", package=\"Matrix\"))),\n Jens Oehlschlägel [ctb] (initial nearPD()),\n Jason Riedy [ctb] (condest() and onenormest() for octave, Copyright:\n Regents of the University of California),\n R Core Team [ctb] (base R matrix implementation)",
+ "Repository": "CRAN",
+ "Date/Publication": "2022-11-11 08:30:10 UTC",
+ "Built": "R 4.2.0; x86_64-apple-darwin17.0; 2022-11-12 12:49:39 UTC; unix",
+ "Archs": "Matrix.so.dSYM"
+ }
+ },
+ "PKI": {
+ "Source": "CRAN",
+ "Repository": "https://cran.rstudio.com",
+ "description": {
+ "Package": "PKI",
+ "Version": "0.1-14",
+ "Title": "Public Key Infrastucture for R Based on the X.509 Standard",
+ "Author": "Simon Urbanek ",
+ "Maintainer": "Simon Urbanek ",
+ "Depends": "R (>= 2.9.0), base64enc",
+ "Enhances": "gmp",
+ "Description": "Public Key Infrastucture functions such as verifying certificates, RSA encription and signing which can be used to build PKI infrastructure and perform cryptographic tasks.",
+ "License": "GPL-2 | GPL-3 | file LICENSE",
+ "URL": "http://www.rforge.net/PKI",
+ "SystemRequirements": "OpenSSL library and headers (openssl-dev or\nsimilar)",
+ "NeedsCompilation": "yes",
+ "Packaged": "2024-06-15 19:22:05 UTC; rforge",
+ "Repository": "CRAN",
+ "Date/Publication": "2024-06-15 19:40:02 UTC",
+ "Built": "R 4.2.2; x86_64-apple-darwin17.0; 2024-07-05 15:25:46 UTC; unix"
+ }
+ },
+ "R6": {
+ "Source": "CRAN",
+ "Repository": "https://cran.rstudio.com",
+ "description": {
+ "Package": "R6",
+ "Title": "Encapsulated Classes with Reference Semantics",
+ "Version": "2.5.1",
+ "Authors@R": "person(\"Winston\", \"Chang\", role = c(\"aut\", \"cre\"), email = \"winston@stdout.org\")",
+ "Description": "Creates classes with reference semantics, similar to R's built-in\n reference classes. Compared to reference classes, R6 classes are simpler\n and lighter-weight, and they are not built on S4 classes so they do not\n require the methods package. These classes allow public and private\n members, and they support inheritance, even when the classes are defined in\n different packages.",
+ "Depends": "R (>= 3.0)",
+ "Suggests": "testthat, pryr",
+ "License": "MIT + file LICENSE",
+ "URL": "https://r6.r-lib.org, https://github.com/r-lib/R6/",
+ "BugReports": "https://github.com/r-lib/R6/issues",
+ "RoxygenNote": "7.1.1",
+ "NeedsCompilation": "no",
+ "Packaged": "2021-08-06 20:18:46 UTC; winston",
+ "Author": "Winston Chang [aut, cre]",
+ "Maintainer": "Winston Chang ",
+ "Repository": "CRAN",
+ "Date/Publication": "2021-08-19 14:00:05 UTC",
+ "Built": "R 4.2.0; ; 2022-04-25 03:04:56 UTC; unix"
+ }
+ },
+ "RColorBrewer": {
+ "Source": "CRAN",
+ "Repository": "https://cran.rstudio.com",
+ "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": "CRAN",
+ "Date/Publication": "2022-04-03 19:20:13 UTC",
+ "Built": "R 4.2.0; ; 2022-04-25 03:14:57 UTC; unix"
+ }
+ },
+ "Rcpp": {
+ "Source": "CRAN",
+ "Repository": "https://cran.rstudio.com",
+ "description": {
+ "Package": "Rcpp",
+ "Title": "Seamless R and C++ Integration",
+ "Version": "1.0.11",
+ "Date": "2023-07-03",
+ "Author": "Dirk Eddelbuettel, Romain Francois, JJ Allaire, Kevin Ushey, Qiang Kou,\n Nathan Russell, Inaki Ucar, Douglas Bates and John Chambers",
+ "Maintainer": "Dirk Eddelbuettel ",
+ "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": "2023-07-03 15:56:55 UTC; edd",
+ "Repository": "CRAN",
+ "Date/Publication": "2023-07-06 07:33:14 UTC",
+ "Built": "R 4.2.0; x86_64-apple-darwin17.0; 2023-07-07 10:24:01 UTC; unix",
+ "Archs": "Rcpp.so.dSYM"
+ }
+ },
+ "S7": {
+ "Source": "CRAN",
+ "Repository": "https://cran.rstudio.com",
+ "description": {
+ "Package": "S7",
+ "Title": "An Object Oriented System Meant to Become a Successor to S3 and\nS4",
+ "Version": "0.1.1",
+ "Authors@R": "c(\n person(\"Object-Oriented Programming Working Group\", role = \"cph\"),\n person(\"Davis\", \"Vaughan\", role = \"aut\"),\n person(\"Jim\", \"Hester\", role = \"aut\",\n comment = c(ORCID = \"0000-0002-2739-7082\")),\n person(\"Tomasz\", \"Kalinowski\", role = \"aut\"),\n person(\"Will\", \"Landau\", role = \"aut\"),\n person(\"Michael\", \"Lawrence\", role = \"aut\"),\n person(\"Martin\", \"Maechler\", role = \"aut\",\n comment = c(ORCID = \"0000-0002-8685-9910\")),\n person(\"Luke\", \"Tierney\", role = \"aut\"),\n person(\"Hadley\", \"Wickham\", , \"hadley@posit.co\", role = c(\"aut\", \"cre\"),\n comment = c(ORCID = \"0000-0003-4757-117X\"))\n )",
+ "Description": "A new object oriented programming system designed to be a successor \n to S3 and S4. It includes formal class, generic, and method specification, \n and a limited form of multiple dispatch. It has been designed and implemented \n collaboratively by the R Consortium Object-Oriented Programming Working Group, \n which includes representatives from R-Core, 'Bioconductor', \n 'Posit'/'tidyverse', and the wider R community.",
+ "License": "MIT + file LICENSE",
+ "URL": "https://github.com/rconsortium/S7/,\nhttps://rconsortium.github.io/S7/",
+ "BugReports": "https://github.com/rconsortium/S7/issues",
+ "Depends": "R (>= 3.5.0)",
+ "Imports": "utils",
+ "Suggests": "bench, covr, knitr, methods, rmarkdown, testthat (>= 3.0.0),\ntibble",
+ "VignetteBuilder": "knitr",
+ "Config/Needs/website": "sloop",
+ "Config/testthat/edition": "3",
+ "Encoding": "UTF-8",
+ "RoxygenNote": "7.2.3",
+ "NeedsCompilation": "yes",
+ "Packaged": "2023-09-17 11:50:09 UTC; hadleywickham",
+ "Author": "Object-Oriented Programming Working Group [cph],\n Davis Vaughan [aut],\n Jim Hester [aut] (),\n Tomasz Kalinowski [aut],\n Will Landau [aut],\n Michael Lawrence [aut],\n Martin Maechler [aut] (),\n Luke Tierney [aut],\n Hadley Wickham [aut, cre] ()",
+ "Maintainer": "Hadley Wickham ",
+ "Repository": "CRAN",
+ "Date/Publication": "2023-09-17 12:10:02 UTC",
+ "Built": "R 4.2.0; x86_64-apple-darwin17.0; 2023-09-18 10:58:07 UTC; unix",
+ "Archs": "S7.so.dSYM"
+ }
+ },
+ "V8": {
+ "Source": "CRAN",
+ "Repository": "https://cran.rstudio.com",
+ "description": {
+ "Package": "V8",
+ "Type": "Package",
+ "Title": "Embedded JavaScript and WebAssembly Engine for R",
+ "Version": "4.2.2",
+ "Authors@R": "c(\n person(\"Jeroen\", \"Ooms\", role = c(\"aut\", \"cre\"), email = \"jeroen@berkeley.edu\",\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 and WebAssembly \n engine. This package can be compiled either with V8 version 6 and up or NodeJS\n when built as a shared library.",
+ "License": "MIT + file LICENSE",
+ "URL": "https://github.com/jeroen/v8 (devel) https://v8.dev (upstream)",
+ "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.2.1",
+ "Language": "en-US",
+ "Encoding": "UTF-8",
+ "Packaged": "2022-11-03 12:45:51 UTC; jeroen",
+ "Author": "Jeroen Ooms [aut, cre] (),\n Jan Marvin Garbuszus [ctb]",
+ "Maintainer": "Jeroen Ooms ",
+ "Repository": "CRAN",
+ "Date/Publication": "2022-11-03 22:10:02 UTC",
+ "Built": "R 4.2.0; x86_64-apple-darwin17.0; 2022-11-04 11:36:33 UTC; unix",
+ "Archs": "V8.so.dSYM"
+ }
+ },
+ "anytime": {
+ "Source": "CRAN",
+ "Repository": "https://cran.rstudio.com",
+ "description": {
+ "Package": "anytime",
+ "Type": "Package",
+ "Title": "Anything to 'POSIXct' or 'Date' Converter",
+ "Version": "0.3.9",
+ "Date": "2020-08-26",
+ "Author": "Dirk Eddelbuettel",
+ "Maintainer": "Dirk Eddelbuettel ",
+ "Description": "Convert input in any one of character, integer, numeric, factor,\n or ordered type into 'POSIXct' (or 'Date') objects, using one of a number of\n predefined formats, and relying on Boost facilities for date and time parsing.",
+ "URL": "http://dirk.eddelbuettel.com/code/anytime.html",
+ "BugReports": "https://github.com/eddelbuettel/anytime/issues",
+ "License": "GPL (>= 2)",
+ "Encoding": "UTF-8",
+ "Depends": "R (>= 3.2.0)",
+ "Imports": "Rcpp (>= 0.12.9)",
+ "LinkingTo": "Rcpp (>= 0.12.9), BH",
+ "Suggests": "tinytest (>= 1.0.0), gettz",
+ "RoxygenNote": "6.0.1",
+ "NeedsCompilation": "yes",
+ "Packaged": "2020-08-26 17:46:45.898451 UTC; edd",
+ "Repository": "CRAN",
+ "Date/Publication": "2020-08-27 11:40:21 UTC",
+ "Built": "R 4.2.0; x86_64-apple-darwin17.0; 2022-04-25 04:10:10 UTC; unix",
+ "Archs": "anytime.so.dSYM"
+ }
+ },
+ "arrow": {
+ "Source": "CRAN",
+ "Repository": "https://cran.rstudio.com",
+ "description": {
+ "Package": "arrow",
+ "Title": "Integration to 'Apache' 'Arrow'",
+ "Version": "11.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\", \"cre\")),\n person(\"Dewey\", \"Dunnington\", role = c(\"aut\"), email = \"dewey@fishandwhistle.net\", comment = c(ORCID = \"0000-0002-9415-4582\")),\n person(\"Romain\", \"Fran\\u00e7ois\", email = \"romain@rstudio.com\", role = c(\"aut\"), comment = c(ORCID = \"0000-0002-2444-4226\")),\n person(\"Jonathan\", \"Keane\", email = \"jkeane@gmail.com\", role = c(\"aut\")),\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(\"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 (>= 3.4)",
+ "License": "Apache License (>= 2.0)",
+ "URL": "https://github.com/apache/arrow/, https://arrow.apache.org/docs/r/",
+ "BugReports": "https://issues.apache.org/jira/projects/ARROW/issues",
+ "Encoding": "UTF-8",
+ "Language": "en-US",
+ "SystemRequirements": "C++17; for AWS S3 support on Linux, libcurl and\nopenssl (optional)",
+ "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.2.3",
+ "Config/testthat/edition": "3",
+ "Suggests": "blob, cli, DBI, dbplyr, decor, distro, dplyr, duckdb (>=\n0.2.8), hms, knitr, lubridate, pillar, pkgload, reticulate,\nrmarkdown, stringi, stringr, sys, testthat (>= 3.1.0), tibble,\ntzdb, 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-collect.R' 'dplyr-count.R'\n'dplyr-datetime-helpers.R' 'dplyr-distinct.R' 'dplyr-eval.R'\n'dplyr-filter.R' 'dplyr-funcs-augmented.R'\n'dplyr-funcs-conditional.R' 'dplyr-funcs-datetime.R'\n'dplyr-funcs-doc.R' '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": "2023-02-10 07:29:17 UTC; nic2",
+ "Author": "Neal Richardson [aut],\n Ian Cook [aut],\n Nic Crane [aut, cre],\n Dewey Dunnington [aut] (),\n Romain François [aut] (),\n Jonathan Keane [aut],\n Dragoș Moldovan-Grünfeld [aut],\n Jeroen Ooms [aut],\n Javier Luraschi [ctb],\n Karl Dunkle Werner [ctb] (),\n Jeffrey Wong [ctb],\n Apache Arrow [aut, cph]",
+ "Maintainer": "Nic Crane ",
+ "Repository": "CRAN",
+ "Date/Publication": "2023-02-12 14:12:07 UTC",
+ "Built": "R 4.2.0; x86_64-apple-darwin17.0; 2023-02-13 13:37:53 UTC; unix",
+ "Archs": "arrow.so.dSYM"
+ }
+ },
+ "askpass": {
+ "Source": "CRAN",
+ "Repository": "https://cran.rstudio.com",
+ "description": {
+ "Package": "askpass",
+ "Type": "Package",
+ "Title": "Password Entry Utilities for R, Git, and SSH",
+ "Version": "1.2.0",
+ "Authors@R": "person(\"Jeroen\", \"Ooms\", role = c(\"aut\", \"cre\"), \n email = \"jeroen@berkeley.edu\", 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://github.com/r-lib/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": "2023-09-03 19:16:12 UTC; jeroen",
+ "Author": "Jeroen Ooms [aut, cre] ()",
+ "Maintainer": "Jeroen Ooms ",
+ "Repository": "CRAN",
+ "Date/Publication": "2023-09-03 20:00:02 UTC",
+ "Built": "R 4.2.0; x86_64-apple-darwin17.0; 2023-09-04 11:03:34 UTC; unix",
+ "Archs": "askpass.so.dSYM"
+ }
+ },
+ "assertthat": {
+ "Source": "CRAN",
+ "Repository": "https://cran.rstudio.com",
+ "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": "CRAN",
+ "Date/Publication": "2019-03-21 14:53:46 UTC",
+ "Built": "R 4.2.0; ; 2022-04-25 04:11:24 UTC; unix"
+ }
+ },
+ "backports": {
+ "Source": "CRAN",
+ "Repository": "https://cran.rstudio.com",
+ "description": {
+ "Package": "backports",
+ "Type": "Package",
+ "Title": "Reimplementations of Functions Introduced Since R-3.0.0",
+ "Version": "1.4.1",
+ "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(\"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.1.2",
+ "Packaged": "2021-12-13 10:49:30 UTC; michel",
+ "Author": "Michel Lang [cre, aut] (),\n R Core Team [aut]",
+ "Repository": "CRAN",
+ "Date/Publication": "2021-12-13 11:30:02 UTC",
+ "Built": "R 4.2.0; x86_64-apple-darwin17.0; 2022-04-25 03:22:31 UTC; unix",
+ "Archs": "backports.so.dSYM"
+ }
+ },
+ "base64enc": {
+ "Source": "CRAN",
+ "Repository": "https://cran.rstudio.com",
+ "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": "CRAN",
+ "Date/Publication": "2015-07-28 08:03:37",
+ "Built": "R 4.2.0; x86_64-apple-darwin17.0; 2022-04-25 03:02:32 UTC; unix",
+ "Archs": "base64enc.so.dSYM"
+ }
+ },
+ "bigD": {
+ "Source": "CRAN",
+ "Repository": "https://cran.rstudio.com",
+ "description": {
+ "Type": "Package",
+ "Package": "bigD",
+ "Title": "Flexibly Format Dates and Times to a Given Locale",
+ "Version": "0.2.0",
+ "Authors@R": "person(\"Richard\", \"Iannone\", , \"riannone@me.com\", c(\"aut\", \"cre\"),\n comment = c(ORCID = \"0000-0003-3925-190X\"))",
+ "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.",
+ "License": "MIT + file LICENSE",
+ "URL": "https://github.com/rich-iannone/bigD",
+ "BugReports": "https://github.com/rich-iannone/bigD/issues",
+ "Depends": "R (>= 3.2.0)",
+ "Encoding": "UTF-8",
+ "RoxygenNote": "7.2.1",
+ "Suggests": "covr, testthat (>= 3.0.0)",
+ "Config/testthat/edition": "3",
+ "Config/testthat/parallel": "true",
+ "NeedsCompilation": "no",
+ "Packaged": "2022-09-02 20:05:54 UTC; rich",
+ "Author": "Richard Iannone [aut, cre] ()",
+ "Maintainer": "Richard Iannone ",
+ "Repository": "CRAN",
+ "Date/Publication": "2022-09-05 08:30:08 UTC",
+ "Built": "R 4.2.0; ; 2022-09-06 12:04:19 UTC; unix"
+ }
+ },
+ "biscale": {
+ "Source": "CRAN",
+ "Repository": "https://cran.rstudio.com",
+ "description": {
+ "Package": "biscale",
+ "Type": "Package",
+ "Title": "Tools and Palettes for Bivariate Thematic Mapping",
+ "Version": "1.0.0",
+ "Authors@R": "c(\n person(\"Christopher\", \"Prener\", , \"chris.prener@gmail.com\", c(\"aut\", \"cre\"),\n comment = c(ORCID = \"0000-0002-4310-9888\")),\n person(\"Timo\", \"Grossenbacher\", , role = \"aut\"),\n person(\"Angelo\", \"Zehr\", , role = \"aut\"),\n person(\"Joshua\", \"Stevens\", , role = \"ctb\"))",
+ "Description": "Provides a 'ggplot2' centric approach to bivariate mapping. This is a \n technique that maps two quantities simultaneously rather than the single value \n that most thematic maps display. The package provides a suite of tools \n for calculating breaks using multiple different approaches, a selection of \n palettes appropriate for bivariate mapping and scale functions for 'ggplot2' \n calls that adds those palettes to maps. Tools for creating bivariate legends \n are also included.",
+ "Depends": "R (>= 3.5)",
+ "License": "GPL-3",
+ "URL": "https://chris-prener.github.io/biscale/",
+ "BugReports": "https://github.com/chris-prener/biscale/issues",
+ "Encoding": "UTF-8",
+ "LazyData": "true",
+ "Imports": "classInt, ggplot2, stats, utils",
+ "RoxygenNote": "7.1.2",
+ "Suggests": "covr, cowplot, knitr, rmarkdown, sf, testthat",
+ "VignetteBuilder": "knitr",
+ "NeedsCompilation": "no",
+ "Packaged": "2022-05-26 18:11:15 UTC; chris",
+ "Author": "Christopher Prener [aut, cre] (),\n Timo Grossenbacher [aut],\n Angelo Zehr [aut],\n Joshua Stevens [ctb]",
+ "Maintainer": "Christopher Prener ",
+ "Repository": "CRAN",
+ "Date/Publication": "2022-05-27 08:40:09 UTC",
+ "Built": "R 4.2.0; ; 2022-05-28 12:21:53 UTC; unix"
+ }
+ },
+ "bit": {
+ "Source": "CRAN",
+ "Repository": "https://cran.rstudio.com",
+ "description": {
+ "Package": "bit",
+ "Type": "Package",
+ "Title": "Classes and Methods for Fast Memory-Efficient Boolean Selections",
+ "Version": "4.0.5",
+ "Date": "2022-11-13",
+ "Author": "Jens Oehlschlägel [aut, cre], Brian Ripley [ctb]",
+ "Maintainer": "Jens Oehlschlägel ",
+ "Depends": "R (>= 2.9.2)",
+ "Suggests": "testthat (>= 0.11.0), roxygen2, knitr, 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/truecluster/bit",
+ "VignetteBuilder": "knitr, rmarkdown",
+ "RoxygenNote": "7.2.0",
+ "NeedsCompilation": "yes",
+ "Packaged": "2022-11-13 21:22:09 UTC; jo",
+ "Repository": "CRAN",
+ "Date/Publication": "2022-11-15 21:20:16 UTC",
+ "Built": "R 4.2.0; x86_64-apple-darwin17.0; 2022-11-16 13:00:11 UTC; unix",
+ "Archs": "bit.so.dSYM"
+ }
+ },
+ "bit64": {
+ "Source": "CRAN",
+ "Repository": "https://cran.rstudio.com",
+ "description": {
+ "Package": "bit64",
+ "Type": "Package",
+ "Title": "A S3 Class for Vectors of 64bit Integers",
+ "Version": "4.0.5",
+ "Date": "2020-08-29",
+ "Author": "Jens Oehlschlägel [aut, cre], Leonardo Silvestri [ctb]",
+ "Maintainer": "Jens Oehlschlägel ",
+ "Depends": "R (>= 3.0.1), bit (>= 4.0.0), utils, methods, stats",
+ "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/truecluster/bit64",
+ "Encoding": "UTF-8",
+ "Repository": "CRAN",
+ "Repository/R-Forge/Project": "ff",
+ "Repository/R-Forge/Revision": "177",
+ "Repository/R-Forge/DateTimeStamp": "2018-08-17 17:45:18",
+ "Date/Publication": "2020-08-30 07:20:02 UTC",
+ "NeedsCompilation": "yes",
+ "Packaged": "2020-08-29 10:56:45 UTC; jo",
+ "Built": "R 4.2.0; x86_64-apple-darwin17.0; 2022-04-26 08:57:08 UTC; unix",
+ "Archs": "bit64.so.dSYM"
+ }
+ },
+ "bitops": {
+ "Source": "CRAN",
+ "Repository": "https://cran.rstudio.com",
+ "description": {
+ "Package": "bitops",
+ "Version": "1.0-7",
+ "Date": "2021-04-13",
+ "Author": "S original by Steve Dutky initial R\n port and extensions by Martin Maechler; revised and modified\n by Steve Dutky",
+ "Maintainer": "Martin Maechler ",
+ "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": "2021-04-13 20:50:22 UTC; maechler",
+ "Repository": "CRAN",
+ "Date/Publication": "2021-04-24 11:40:08 UTC",
+ "Built": "R 4.2.0; x86_64-apple-darwin17.0; 2022-04-25 04:08:03 UTC; unix",
+ "Archs": "bitops.so.dSYM"
+ }
+ },
+ "blob": {
+ "Source": "CRAN",
+ "Repository": "https://cran.rstudio.com",
+ "description": {
+ "Package": "blob",
+ "Title": "A Simple S3 Class for Representing Vectors of Binary Data\n('BLOBS')",
+ "Version": "1.2.3",
+ "Authors@R": "c(\n person(\"Hadley\", \"Wickham\", role = \"aut\"),\n person(\"Kirill\", \"Müller\", , \"krlmlr+r@mailbox.org\", role = \"cre\"),\n person(\"RStudio\", role = c(\"cph\", \"fnd\"))\n )",
+ "Description": "R's raw vector is useful for storing a single binary object.\n What if you want to put a vector of them in a data frame? The 'blob'\n package provides the blob object, a list of raw vectors, suitable for\n use as a column in data frame.",
+ "License": "MIT + file LICENSE",
+ "URL": "https://blob.tidyverse.org, https://github.com/tidyverse/blob",
+ "BugReports": "https://github.com/tidyverse/blob/issues",
+ "Imports": "methods, rlang, vctrs (>= 0.2.1)",
+ "Suggests": "covr, crayon, pillar (>= 1.2.1), testthat",
+ "Config/autostyle/scope": "line_breaks",
+ "Config/autostyle/strict": "false",
+ "Config/Needs/website": "tidyverse/tidytemplate",
+ "Encoding": "UTF-8",
+ "RoxygenNote": "7.1.2",
+ "NeedsCompilation": "no",
+ "Packaged": "2022-04-10 05:32:26 UTC; kirill",
+ "Author": "Hadley Wickham [aut],\n Kirill Müller [cre],\n RStudio [cph, fnd]",
+ "Maintainer": "Kirill Müller ",
+ "Repository": "CRAN",
+ "Date/Publication": "2022-04-10 06:22:28 UTC",
+ "Built": "R 4.2.0; ; 2022-04-26 09:07:18 UTC; unix"
+ }
+ },
+ "brew": {
+ "Source": "CRAN",
+ "Repository": "https://cran.rstudio.com",
+ "description": {
+ "Type": "Package",
+ "Package": "brew",
+ "Title": "Templating Framework for Report Generation",
+ "Version": "1.0-8",
+ "Authors@R": "c(\n person(\"Jeffrey\", \"Horner\", role = c(\"aut\", \"cph\")),\n person(\"Greg\", \"Hunt\", , \"greg@firmansyah.com\", role = c(\"aut\", \"cre\", \"cph\"))\n )",
+ "Description": "Implements a templating framework for mixing text and R code\n for report generation. brew template syntax is similar to PHP, Ruby's\n erb module, Java Server Pages, and Python's psp module.",
+ "License": "GPL-2",
+ "URL": "https://github.com/gregfrog/brew",
+ "BugReports": "https://github.com/gregfrog/brew/issues",
+ "Suggests": "testthat (>= 3.0.0)",
+ "Config/testthat/edition": "3",
+ "Encoding": "UTF-8",
+ "Repository": "CRAN",
+ "NeedsCompilation": "no",
+ "Packaged": "2022-09-28 07:04:26 UTC; greg",
+ "Author": "Jeffrey Horner [aut, cph],\n Greg Hunt [aut, cre, cph]",
+ "Maintainer": "Greg Hunt ",
+ "Date/Publication": "2022-09-29 08:10:18 UTC",
+ "Built": "R 4.2.0; ; 2022-09-30 11:58:02 UTC; unix"
+ }
+ },
+ "brio": {
+ "Source": "CRAN",
+ "Repository": "https://cran.rstudio.com",
+ "description": {
+ "Package": "brio",
+ "Title": "Basic R Input Output",
+ "Version": "1.1.3",
+ "Authors@R": "c(\n person(\"Jim\", \"Hester\", role = \"aut\",\n comment = c(ORCID = \"0000-0002-2739-7082\")),\n person(\"Gábor\", \"Csárdi\", , \"csardi.gabor@gmail.com\", role = c(\"aut\", \"cre\")),\n person(\"RStudio\", role = c(\"cph\", \"fnd\"))\n )",
+ "Description": "Functions to handle basic input output, these functions\n always read and write UTF-8 (8-bit Unicode Transformation Format)\n files and provide more explicit control over line endings.",
+ "License": "MIT + file LICENSE",
+ "URL": "https://brio.r-lib.org, https://github.com/r-lib/brio",
+ "BugReports": "https://github.com/r-lib/brio/issues",
+ "Suggests": "covr, testthat (>= 2.1.0)",
+ "Encoding": "UTF-8",
+ "RoxygenNote": "7.1.2",
+ "NeedsCompilation": "yes",
+ "Packaged": "2021-11-29 23:19:46 UTC; jhester",
+ "Author": "Jim Hester [aut] (),\n Gábor Csárdi [aut, cre],\n RStudio [cph, fnd]",
+ "Maintainer": "Gábor Csárdi ",
+ "Repository": "CRAN",
+ "Date/Publication": "2021-11-30 13:10:02 UTC",
+ "Built": "R 4.2.0; x86_64-apple-darwin17.0; 2022-04-25 03:54:44 UTC; unix",
+ "Archs": "brio.so.dSYM"
+ }
+ },
+ "broom": {
+ "Source": "CRAN",
+ "Repository": "https://cran.rstudio.com",
+ "description": {
+ "Type": "Package",
+ "Package": "broom",
+ "Title": "Convert Statistical Objects into Tidy Tibbles",
+ "Version": "1.0.5",
+ "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, dplyr (>= 1.0.0), ellipsis, generics (>= 0.0.2),\nglue, lifecycle, purrr, rlang, stringr, tibble (>= 3.0.0),\ntidyr (>= 1.0.0)",
+ "Suggests": "AER, AUC, bbmle, betareg, biglm, binGroup, boot, btergm (>=\n1.10.6), car, carData, caret, cluster, cmprsk, coda, covr, drc,\ne1071, emmeans, epiR, ergm (>= 3.10.4), fixest (>= 0.9.0), gam\n(>= 1.15), gee, geepack, ggplot2, glmnet, glmnetUtils, gmm,\nHmisc, irlba, interp, joineRML, Kendall, knitr, ks, Lahman,\nlavaan, leaps, lfe, lm.beta, lme4, lmodel2, lmtest (>= 0.9.38),\nlsmeans, maps, margins, MASS, mclust, mediation, metafor, mfx,\nmgcv, mlogit, modeldata, modeltests, muhaz, multcomp, network,\nnnet, orcutt (>= 2.2), ordinal, plm, poLCA, psych, quantreg,\nrmarkdown, robust, robustbase, rsample, sandwich, sp, spdep (>=\n1.1), spatialreg, speedglm, spelling, survey, survival,\nsystemfit, testthat (>= 2.1.0), tseries, vars, zoo",
+ "VignetteBuilder": "knitr",
+ "Config/Needs/website": "tidyverse/tidytemplate",
+ "Encoding": "UTF-8",
+ "RoxygenNote": "7.2.3",
+ "Language": "en-US",
+ "Collate": "'aaa-documentation-helper.R' 'null-and-default-tidiers.R'\n'aer-tidiers.R' 'auc-tidiers.R' 'base-tidiers.R'\n'bbmle-tidiers.R' 'betareg-tidiers.R' 'biglm-tidiers.R'\n'bingroup-tidiers.R' 'boot-tidiers.R' 'broom-package.R'\n'broom.R' 'btergm-tidiers.R' 'car-tidiers.R' 'caret-tidiers.R'\n'cluster-tidiers.R' 'cmprsk-tidiers.R' 'data-frame-tidiers.R'\n'deprecated-0-7-0.R' 'drc-tidiers.R' 'emmeans-tidiers.R'\n'epiR-tidiers.R' 'ergm-tidiers.R' 'fixest-tidiers.R'\n'gam-tidiers.R' 'geepack-tidiers.R'\n'glmnet-cv-glmnet-tidiers.R' 'glmnet-glmnet-tidiers.R'\n'gmm-tidiers.R' 'hmisc-tidiers.R' 'joinerml-tidiers.R'\n'kendall-tidiers.R' 'ks-tidiers.R' 'lavaan-tidiers.R'\n'leaps-tidiers.R' 'lfe-tidiers.R' 'list-irlba.R'\n'list-optim-tidiers.R' 'list-svd-tidiers.R' 'list-tidiers.R'\n'list-xyz-tidiers.R' 'lm-beta-tidiers.R' 'lmodel2-tidiers.R'\n'lmtest-tidiers.R' 'maps-tidiers.R' 'margins-tidiers.R'\n'mass-fitdistr-tidiers.R' 'mass-negbin-tidiers.R'\n'mass-polr-tidiers.R' 'mass-ridgelm-tidiers.R'\n'stats-lm-tidiers.R' 'mass-rlm-tidiers.R' 'mclust-tidiers.R'\n'mediation-tidiers.R' 'metafor-tidiers.R' 'mfx-tidiers.R'\n'mgcv-tidiers.R' 'mlogit-tidiers.R' 'muhaz-tidiers.R'\n'multcomp-tidiers.R' 'nnet-tidiers.R' 'nobs.R'\n'orcutt-tidiers.R' 'ordinal-clm-tidiers.R'\n'ordinal-clmm-tidiers.R' 'plm-tidiers.R' 'polca-tidiers.R'\n'psych-tidiers.R' 'stats-nls-tidiers.R'\n'quantreg-nlrq-tidiers.R' 'quantreg-rq-tidiers.R'\n'quantreg-rqs-tidiers.R' 'robust-glmrob-tidiers.R'\n'robust-lmrob-tidiers.R' 'robustbase-glmrob-tidiers.R'\n'robustbase-lmrob-tidiers.R' 'sp-tidiers.R' 'spdep-tidiers.R'\n'speedglm-speedglm-tidiers.R' 'speedglm-speedlm-tidiers.R'\n'stats-anova-tidiers.R' 'stats-arima-tidiers.R'\n'stats-decompose-tidiers.R' 'stats-factanal-tidiers.R'\n'stats-glm-tidiers.R' 'stats-htest-tidiers.R'\n'stats-kmeans-tidiers.R' 'stats-loess-tidiers.R'\n'stats-mlm-tidiers.R' 'stats-prcomp-tidiers.R'\n'stats-smooth.spline-tidiers.R' 'stats-summary-lm-tidiers.R'\n'stats-time-series-tidiers.R' 'survey-tidiers.R'\n'survival-aareg-tidiers.R' 'survival-cch-tidiers.R'\n'survival-coxph-tidiers.R' 'survival-pyears-tidiers.R'\n'survival-survdiff-tidiers.R' 'survival-survexp-tidiers.R'\n'survival-survfit-tidiers.R' 'survival-survreg-tidiers.R'\n'systemfit-tidiers.R' 'tseries-tidiers.R' 'utilities.R'\n'vars-tidiers.R' 'zoo-tidiers.R' 'zzz.R'",
+ "NeedsCompilation": "no",
+ "Packaged": "2023-06-09 21:21:49 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": "CRAN",
+ "Date/Publication": "2023-06-09 22:50:02 UTC",
+ "Built": "R 4.2.0; ; 2023-06-10 11:35:00 UTC; unix"
+ }
+ },
+ "bslib": {
+ "Source": "CRAN",
+ "Repository": "https://cran.rstudio.com",
+ "description": {
+ "Package": "bslib",
+ "Title": "Custom 'Bootstrap' 'Sass' Themes for 'shiny' and 'rmarkdown'",
+ "Version": "0.7.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, withr",
+ "Config/Needs/deploy": "BH, chiflights22, colourpicker, commonmark, cpp11,\ncpsievert/chiflights22, cpsievert/histoslider, dplyr, DT,\nggplot2, ggridges, gt, hexbin, histoslider, htmlwidgets,\nlattice, leaflet, lubridate, modelr, plotly, reactable,\nreshape2, rprojroot, rsconnect, rstudio/shiny, scales, styler,\ntibble",
+ "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.1",
+ "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-builtin.R' 'bs-theme-preset.R' 'utils.R'\n'bs-theme-preview.R' 'bs-theme-update.R' 'bs-theme.R'\n'bslib-package.R' 'buttons.R' 'card.R' 'deprecated.R' 'files.R'\n'fill.R' 'imports.R' 'input-dark-mode.R' 'input-switch.R'\n'layout.R' 'nav-items.R' 'nav-update.R' 'navs-legacy.R'\n'navs.R' 'onLoad.R' 'page.R' 'popover.R' 'precompiled.R'\n'print.R' 'shiny-devmode.R' 'sidebar.R' 'staticimports.R'\n'tooltip.R' 'utils-deps.R' 'utils-shiny.R' 'utils-tags.R'\n'value-box.R' 'version-default.R' 'versions.R'",
+ "NeedsCompilation": "no",
+ "Packaged": "2024-03-28 21:43:16 UTC; cpsievert",
+ "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": "CRAN",
+ "Date/Publication": "2024-03-29 01:00:03 UTC",
+ "Built": "R 4.2.2; ; 2024-06-20 17:42:41 UTC; unix"
+ }
+ },
+ "cachem": {
+ "Source": "CRAN",
+ "Repository": "https://cran.rstudio.com",
+ "description": {
+ "Package": "cachem",
+ "Version": "1.0.8",
+ "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@rstudio.com\", c(\"aut\", \"cre\")),\n person(family = \"RStudio\", 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.1.1)",
+ "Suggests": "testthat",
+ "RoxygenNote": "7.2.3",
+ "Config/Needs/routine": "lobstr",
+ "Config/Needs/website": "pkgdown",
+ "NeedsCompilation": "yes",
+ "Packaged": "2023-05-01 15:38:38 UTC; winston",
+ "Author": "Winston Chang [aut, cre],\n RStudio [cph, fnd]",
+ "Maintainer": "Winston Chang ",
+ "Repository": "CRAN",
+ "Date/Publication": "2023-05-01 16:40:02 UTC",
+ "Built": "R 4.2.0; x86_64-apple-darwin17.0; 2023-05-02 12:23:34 UTC; unix",
+ "Archs": "cachem.so.dSYM"
+ }
+ },
+ "callr": {
+ "Source": "CRAN",
+ "Repository": "https://cran.rstudio.com",
+ "description": {
+ "Package": "callr",
+ "Title": "Call R from R",
+ "Version": "3.7.3",
+ "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(\"RStudio\", role = c(\"cph\", \"fnd\")),\n person(\"Mango Solutions\", 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#readme",
+ "BugReports": "https://github.com/r-lib/callr/issues",
+ "Depends": "R (>= 3.4)",
+ "Imports": "processx (>= 3.6.1), R6, utils",
+ "Suggests": "asciicast, cli (>= 1.1.0), covr, mockery, ps, rprojroot,\nspelling, testthat (>= 3.0.0), withr (>= 2.3.0)",
+ "Encoding": "UTF-8",
+ "Language": "en-US",
+ "RoxygenNote": "7.2.1.9000",
+ "Config/testthat/edition": "3",
+ "Config/Needs/website": "r-lib/asciicast, glue, htmlwidgets, igraph,\ntibble, tidyverse/tidytemplate",
+ "NeedsCompilation": "no",
+ "Packaged": "2022-11-02 15:17:20 UTC; gaborcsardi",
+ "Author": "Gábor Csárdi [aut, cre, cph] (),\n Winston Chang [aut],\n RStudio [cph, fnd],\n Mango Solutions [cph, fnd]",
+ "Maintainer": "Gábor Csárdi ",
+ "Repository": "CRAN",
+ "Date/Publication": "2022-11-02 16:40:11 UTC",
+ "Built": "R 4.2.0; ; 2022-11-03 11:51:24 UTC; unix"
+ }
+ },
+ "cellranger": {
+ "Source": "CRAN",
+ "Repository": "https://cran.rstudio.com",
+ "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": "CRAN",
+ "Date/Publication": "2016-07-27 03:17:48",
+ "Built": "R 4.2.0; ; 2022-04-27 14:06:42 UTC; unix"
+ }
+ },
+ "cincy": {
+ "Source": "github",
+ "Repository": null,
+ "description": {
+ "Package": "cincy",
+ "Title": "Cincinnati Neighborhood, Tract, County, and ZIP Code Geographies",
+ "Version": "1.1.0",
+ "Authors@R": "c(\n person(\"Cole\", \"Brokamp\", , \"cole.brokamp@gmail.com\", role = c(\"aut\", \"cre\")),\n person(\"Erika\", \"Rasnick\", role = c(\"aut\"))\n )",
+ "Description": "Provide simple feature (sf) objects for Cincinnati neighborhood, tract, county, and ZIP code geographies.",
+ "License": "GPL (>= 3)",
+ "Encoding": "UTF-8",
+ "Roxygen": "list(markdown = TRUE)",
+ "RoxygenNote": "7.3.2",
+ "Depends": "R (>= 2.10)",
+ "LazyData": "true",
+ "LazyDataCompression": "xz",
+ "URL": "https://geomarker.io/cincy/",
+ "Imports": "dplyr, rlang (>= 0.4.11), sf, tibble, tidyselect",
+ "Suggests": "GGally, ggsflabel, knitr, rmarkdown, roxygen2, testthat (>=\n3.0.0), tmap, cowplot, ggthemes, leaflet, ggplot2, tidyr, glue,\nleafsync, leaflet.extras, purrr",
+ "Remotes": "yutannihilation/ggsflabel,",
+ "Config/testthat/edition": "3",
+ "VignetteBuilder": "knitr",
+ "RemoteType": "github",
+ "RemoteHost": "api.github.com",
+ "RemoteRepo": "cincy",
+ "RemoteUsername": "geomarker-io",
+ "RemoteRef": "HEAD",
+ "RemoteSha": "9c6a6a14208c4bd040d00187e1e65351ca0f977f",
+ "GithubRepo": "cincy",
+ "GithubUsername": "geomarker-io",
+ "GithubRef": "HEAD",
+ "GithubSHA1": "9c6a6a14208c4bd040d00187e1e65351ca0f977f",
+ "NeedsCompilation": "no",
+ "Packaged": "2024-09-13 15:07:01 UTC; vanug6",
+ "Author": "Cole Brokamp [aut, cre],\n Erika Rasnick [aut]",
+ "Maintainer": "Cole Brokamp ",
+ "Built": "R 4.2.2; ; 2024-09-13 15:07:11 UTC; unix"
+ }
+ },
+ "class": {
+ "Source": "CRAN",
+ "Repository": "https://cran.rstudio.com",
+ "description": {
+ "Package": "class",
+ "Priority": "recommended",
+ "Version": "7.3-20",
+ "Date": "2022-01-12",
+ "Depends": "R (>= 3.0.0), stats, utils",
+ "Imports": "MASS",
+ "Authors@R": "c(person(\"Brian\", \"Ripley\", role = c(\"aut\", \"cre\", \"cph\"),\n email = \"ripley@stats.ox.ac.uk\"),\n person(\"William\", \"Venables\", role = \"cph\"))",
+ "Description": "Various functions for classification, including k-nearest\n neighbour, Learning Vector Quantization and Self-Organizing Maps.",
+ "Title": "Functions for Classification",
+ "ByteCompile": "yes",
+ "License": "GPL-2 | GPL-3",
+ "URL": "http://www.stats.ox.ac.uk/pub/MASS4/",
+ "NeedsCompilation": "yes",
+ "Packaged": "2022-01-13 05:06:38 UTC; ripley",
+ "Author": "Brian Ripley [aut, cre, cph],\n William Venables [cph]",
+ "Maintainer": "Brian Ripley ",
+ "Repository": "CRAN",
+ "Date/Publication": "2022-01-16 10:24:56 UTC",
+ "Built": "R 4.2.2; x86_64-apple-darwin17.0; 2022-10-31 22:33:28 UTC; unix"
+ }
+ },
+ "classInt": {
+ "Source": "CRAN",
+ "Repository": "https://cran.rstudio.com",
+ "description": {
+ "Package": "classInt",
+ "Version": "0.4-10",
+ "Date": "2023-08-24",
+ "Title": "Choose Univariate Class Intervals",
+ "Authors@R": "c(\n person(\"Roger\", \"Bivand\", role=c(\"aut\", \"cre\"), email=\"Roger.Bivand@nhh.no\", comment=c(ORCID=\"0000-0003-2392-6140\")),\n person(\"Bill\", \"Denney\", role=\"ctb\", comment=c(ORCID=\"0000-0002-5759-428X\")),\n person(\"Richard\", \"Dunlap\", role=\"ctb\"),\n person(\"Diego\", \"Hernangómez\", role=\"ctb\", comment=c(ORCID=\"0000-0001-8457-4658\")),\n person(\"Hisaji\", \"Ono\", role=\"ctb\"),\n person(\"Josiah\", \"Parry\", role = \"ctb\", comment = c(ORCID = \"0000-0001-9910-865X\")),\n person(\"Matthieu\", \"Stigler\", role=\"ctb\", comment =c(ORCID=\"0000-0002-6802-4290\")))",
+ "Depends": "R (>= 2.2)",
+ "Imports": "grDevices, stats, graphics, e1071, class, KernSmooth",
+ "Suggests": "spData (>= 0.2.6.2), units, knitr, rmarkdown, tinytest",
+ "NeedsCompilation": "yes",
+ "Description": "Selected commonly used methods for choosing univariate class intervals for mapping or other graphics purposes.",
+ "License": "GPL (>= 2)",
+ "URL": "https://r-spatial.github.io/classInt/,\nhttps://github.com/r-spatial/classInt/",
+ "BugReports": "https://github.com/r-spatial/classInt/issues/",
+ "RoxygenNote": "6.1.1",
+ "Encoding": "UTF-8",
+ "VignetteBuilder": "knitr",
+ "Packaged": "2023-09-05 08:36:55 UTC; rsb",
+ "Author": "Roger Bivand [aut, cre] (),\n Bill Denney [ctb] (),\n Richard Dunlap [ctb],\n Diego Hernangómez [ctb] (),\n Hisaji Ono [ctb],\n Josiah Parry [ctb] (),\n Matthieu Stigler [ctb] ()",
+ "Maintainer": "Roger Bivand ",
+ "Repository": "CRAN",
+ "Date/Publication": "2023-09-05 13:00:06 UTC",
+ "Built": "R 4.2.0; x86_64-apple-darwin17.0; 2023-09-06 11:37:53 UTC; unix",
+ "Archs": "classInt.so.dSYM"
+ }
+ },
+ "cli": {
+ "Source": "CRAN",
+ "Repository": "https://cran.rstudio.com",
+ "description": {
+ "Package": "cli",
+ "Title": "Helpers for Developing Command Line Interfaces",
+ "Version": "3.6.2",
+ "Authors@R": "c(\n person(\"Gábor\", \"Csárdi\", , \"csardi.gabor@gmail.com\", 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, mockery, processx, ps\n(>= 1.3.4.9000), rlang (>= 1.0.2.9003), rmarkdown, rprojroot,\nrstudioapi, testthat, 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.2.3",
+ "NeedsCompilation": "yes",
+ "Packaged": "2023-12-10 22:38:10 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": "CRAN",
+ "Date/Publication": "2023-12-11 07:40:13 UTC",
+ "Built": "R 4.2.0; x86_64-apple-darwin17.0; 2023-12-21 01:44:20 UTC; unix",
+ "Archs": "cli.so.dSYM"
+ }
+ },
+ "clipr": {
+ "Source": "CRAN",
+ "Repository": "https://cran.rstudio.com",
+ "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": "CRAN",
+ "Date/Publication": "2022-02-22 00:58:45 UTC",
+ "Built": "R 4.2.0; ; 2022-05-13 02:20:35 UTC; unix"
+ }
+ },
+ "codec": {
+ "Source": "github",
+ "Repository": null,
+ "description": {
+ "Package": "codec",
+ "Title": "Community Data Explorer for Cincinnati",
+ "Version": "2.1.0",
+ "Authors@R": "c(\n person(\"Cole\", \"Brokamp\",\n email = \"cole.brokamp@gmail.com\",\n\t role = c(\"aut\", \"cre\")),\n person(\"Erika\", \"Manning\",\n role = \"aut\"),\n person(\"Andrew\", \"Vancil\",\n role = \"aut\")\n\t )",
+ "Description": "This repository serves as the definition of the CoDEC data specifications and provides helpers to create, validate, release, and read CoDEC data.",
+ "License": "GPL (>= 3)",
+ "Encoding": "UTF-8",
+ "Roxygen": "list(markdown = TRUE)",
+ "RoxygenNote": "7.3.2",
+ "Suggests": "testthat (>= 3.0.0), roxygen2, rmarkdown, dplyr, curl, glue,\ntibble",
+ "Remotes": "geomarker-io/cincy, cole-brokamp/dpkg",
+ "Config/testthat/edition": "3",
+ "URL": "https://github.com/geomarker-io/codec, http://geomarker.io/codec/",
+ "BugReports": "https://github.com/geomarker-io/codec/issues",
+ "Imports": "rlang, stringr, purrr (>= 1.0.0), cincy (>= 1.1.0), dpkg (>=\n0.5.1)",
+ "Depends": "R (>= 3.5.0)",
+ "RemoteType": "github",
+ "RemoteHost": "api.github.com",
+ "RemoteRepo": "codec",
+ "RemoteUsername": "geomarker-io",
+ "RemoteRef": "HEAD",
+ "RemoteSha": "c127a69c0a742948637d3ae1808b6f2d95acdc39",
+ "GithubRepo": "codec",
+ "GithubUsername": "geomarker-io",
+ "GithubRef": "HEAD",
+ "GithubSHA1": "c127a69c0a742948637d3ae1808b6f2d95acdc39",
+ "NeedsCompilation": "no",
+ "Packaged": "2024-09-16 13:34:47 UTC; vanug6",
+ "Author": "Cole Brokamp [aut, cre],\n Erika Manning [aut],\n Andrew Vancil [aut]",
+ "Maintainer": "Cole Brokamp ",
+ "Built": "R 4.2.2; ; 2024-09-16 13:34:48 UTC; unix"
+ }
+ },
+ "colorspace": {
+ "Source": "CRAN",
+ "Repository": "https://cran.rstudio.com",
+ "description": {
+ "Package": "colorspace",
+ "Version": "2.1-0",
+ "Date": "2023-01-23",
+ "Title": "A Toolbox for Manipulating and Assessing Colors and Palettes",
+ "Authors@R": "c(person(given = \"Ross\", family = \"Ihaka\", role = \"aut\", email = \"ihaka@stat.auckland.ac.nz\"),\n person(given = \"Paul\", family = \"Murrell\", role = \"aut\", email = \"paul@stat.auckland.ac.nz\",\n comment = c(ORCID = \"0000-0002-3224-8858\")),\n person(given = \"Kurt\", family = \"Hornik\", role = \"aut\", email = \"Kurt.Hornik@R-project.org\",\n\t\t comment = c(ORCID = \"0000-0003-4198-9911\")),\n person(given = c(\"Jason\", \"C.\"), family = \"Fisher\", role = \"aut\", email = \"jfisher@usgs.gov\",\n comment = c(ORCID = \"0000-0001-9032-8912\")),\n person(given = \"Reto\", family = \"Stauffer\", role = \"aut\", email = \"Reto.Stauffer@uibk.ac.at\",\n comment = c(ORCID = \"0000-0002-3798-5507\")),\n person(given = c(\"Claus\", \"O.\"), family = \"Wilke\", role = \"aut\", email = \"wilke@austin.utexas.edu\",\n comment = c(ORCID = \"0000-0002-7470-9261\")),\n person(given = c(\"Claire\", \"D.\"), family = \"McWhite\", role = \"aut\", email = \"claire.mcwhite@utmail.utexas.edu\",\n comment = c(ORCID = \"0000-0001-7346-3047\")),\n person(given = \"Achim\", family = \"Zeileis\", role = c(\"aut\", \"cre\"), email = \"Achim.Zeileis@R-project.org\",\n comment = c(ORCID = \"0000-0003-0918-3766\")))",
+ "Description": "Carries out mapping between assorted color spaces including RGB, HSV, HLS,\n CIEXYZ, CIELUV, HCL (polar CIELUV), CIELAB, and polar CIELAB.\n\t Qualitative, sequential, and diverging color palettes based on HCL colors\n\t are provided along with corresponding ggplot2 color scales.\n\t Color palette choice is aided by an interactive app (with either a Tcl/Tk\n\t or a shiny graphical user interface) and shiny apps with an HCL color picker and a\n\t color vision deficiency emulator. Plotting functions for displaying\n\t and assessing palettes include color swatches, visualizations of the\n\t HCL space, and trajectories in HCL and/or RGB spectrum. Color manipulation\n\t functions include: desaturation, lightening/darkening, mixing, and\n\t simulation of color vision deficiencies (deutanomaly, protanomaly, tritanomaly).\n\t Details can be found on the project web page at \n\t and in the accompanying scientific paper: Zeileis et al. (2020, Journal of Statistical\n\t Software, ).",
+ "Depends": "R (>= 3.0.0), methods",
+ "Imports": "graphics, grDevices, stats",
+ "Suggests": "datasets, utils, KernSmooth, MASS, kernlab, mvtnorm, vcd,\ntcltk, shiny, shinyjs, ggplot2, dplyr, scales, grid, png, jpeg,\nknitr, rmarkdown, RColorBrewer, rcartocolor, scico, viridis,\nwesanderson",
+ "VignetteBuilder": "knitr",
+ "License": "BSD_3_clause + file LICENSE",
+ "URL": "https://colorspace.R-Forge.R-project.org/, https://hclwizard.org/",
+ "BugReports": "https://colorspace.R-Forge.R-project.org/contact.html",
+ "LazyData": "yes",
+ "Encoding": "UTF-8",
+ "RoxygenNote": "7.2.3",
+ "NeedsCompilation": "yes",
+ "Packaged": "2023-01-23 08:50:11 UTC; zeileis",
+ "Author": "Ross Ihaka [aut],\n Paul Murrell [aut] (),\n Kurt Hornik [aut] (),\n Jason C. Fisher [aut] (),\n Reto Stauffer [aut] (),\n Claus O. Wilke [aut] (),\n Claire D. McWhite [aut] (),\n Achim Zeileis [aut, cre] ()",
+ "Maintainer": "Achim Zeileis ",
+ "Repository": "CRAN",
+ "Date/Publication": "2023-01-23 11:40:02 UTC",
+ "Built": "R 4.2.0; x86_64-apple-darwin17.0; 2023-01-24 13:04:27 UTC; unix",
+ "Archs": "colorspace.so.dSYM"
+ }
+ },
+ "colourpicker": {
+ "Source": "CRAN",
+ "Repository": "https://cran.rstudio.com",
+ "description": {
+ "Package": "colourpicker",
+ "Type": "Package",
+ "Title": "A Colour Picker Tool for Shiny and for Selecting Colours in\nPlots",
+ "Version": "1.2.0",
+ "Authors@R": "c(\n person(\"Dean\", \"Attali\", \n email = \"daattali@gmail.com\",\n role = c(\"aut\", \"cre\"),\n comment= c(ORCID=\"0000-0002-5645-3493\")),\n person(\"David\", \"Griswold\", email=\"novachild@gmail.com\",\n role = \"ctb\")\n )",
+ "Description": "A colour picker that can be used as an input in 'Shiny' apps\n or Rmarkdown documents. The colour picker supports alpha opacity, custom\n colour palettes, and many more options. A Plot Colour Helper tool is\n available as an 'RStudio' Addin, which helps you pick colours to use in your\n plots. A more generic Colour Picker 'RStudio' Addin is also provided to let \n you select colours to use in your R code.",
+ "URL": "https://github.com/daattali/colourpicker",
+ "BugReports": "https://github.com/daattali/colourpicker/issues",
+ "Depends": "R (>= 3.1.0)",
+ "Imports": "ggplot2, htmltools, htmlwidgets (>= 0.7), jsonlite, miniUI (>=\n0.1.1), shiny (>= 0.11.1), shinyjs (>= 2.0.0), utils",
+ "Suggests": "knitr (>= 1.7), rmarkdown, rstudioapi (>= 0.5),\nshinydisconnect",
+ "License": "MIT + file LICENSE",
+ "Encoding": "UTF-8",
+ "RoxygenNote": "7.1.1",
+ "NeedsCompilation": "no",
+ "Packaged": "2022-10-28 04:54:54 UTC; Dean-X1C",
+ "Author": "Dean Attali [aut, cre] (),\n David Griswold [ctb]",
+ "Maintainer": "Dean Attali ",
+ "Repository": "CRAN",
+ "Date/Publication": "2022-10-28 06:55:19 UTC",
+ "Built": "R 4.2.0; ; 2022-10-29 12:24:34 UTC; unix"
+ }
+ },
+ "commonmark": {
+ "Source": "CRAN",
+ "Repository": "https://cran.rstudio.com",
+ "description": {
+ "Package": "commonmark",
+ "Type": "Package",
+ "Title": "High Performance CommonMark and Github Markdown Rendering in R",
+ "Version": "1.8.1",
+ "Authors@R": "c(\n person(\"Jeroen\", \"Ooms\", ,\"jeroen@berkeley.edu\", role = c(\"aut\", \"cre\"),\n comment = c(ORCID = \"0000-0002-4035-0289\")),\n person(\"John MacFarlane\", role = \"cph\", comment = \"Author of cmark\"))",
+ "URL": "https://docs.ropensci.org/commonmark/ (docs)\nhttps://github.com/r-lib/commonmark (devel)\nhttps://github.github.com/gfm/ (spec)",
+ "BugReports": "https://github.com/r-lib/commonmark/issues",
+ "Description": "The CommonMark specification defines a rationalized version of markdown\n syntax. This package uses the 'cmark' reference implementation for converting\n markdown text into various formats including html, latex and groff man. In\n addition it exposes the markdown parse tree in xml format. Also includes opt-in\n support for GFM extensions including tables, autolinks, and strikethrough text.",
+ "License": "BSD_2_clause + file LICENSE",
+ "Suggests": "curl, testthat, xml2",
+ "RoxygenNote": "7.1.2",
+ "Language": "en-US",
+ "Encoding": "UTF-8",
+ "NeedsCompilation": "yes",
+ "Packaged": "2022-10-14 12:04:12 UTC; jeroen",
+ "Author": "Jeroen Ooms [aut, cre] (),\n John MacFarlane [cph] (Author of cmark)",
+ "Maintainer": "Jeroen Ooms ",
+ "Repository": "CRAN",
+ "Date/Publication": "2022-10-14 12:42:33 UTC",
+ "Built": "R 4.2.0; x86_64-apple-darwin17.0; 2022-10-15 11:27:55 UTC; unix",
+ "Archs": "commonmark.so.dSYM"
+ }
+ },
+ "cowplot": {
+ "Source": "CRAN",
+ "Repository": "https://cran.rstudio.com",
+ "description": {
+ "Package": "cowplot",
+ "Title": "Streamlined Plot Theme and Plot Annotations for 'ggplot2'",
+ "Version": "1.1.1",
+ "Authors@R": "\n person(\n given = \"Claus O.\",\n family = \"Wilke\",\n role = c(\"aut\", \"cre\"),\n email = \"wilke@austin.utexas.edu\",\n comment = c(ORCID = \"0000-0002-7470-9261\")\n )",
+ "Description": "\n Provides various features that help with creating publication-quality figures\n with 'ggplot2', such as a set of themes, functions to align plots and arrange\n them into complex compound figures, and functions that make it easy to annotate\n plots and or mix plots with images. The package was originally written for\n internal use in the Wilke lab, hence the name (Claus O. Wilke's plot package).\n It has also been used extensively in the book Fundamentals of Data\n Visualization.",
+ "URL": "https://wilkelab.org/cowplot/",
+ "BugReports": "https://github.com/wilkelab/cowplot/issues",
+ "Depends": "R (>= 3.5.0)",
+ "Imports": "ggplot2 (> 2.2.1), grid, gtable, grDevices, methods, rlang,\nscales",
+ "License": "GPL-2",
+ "LazyData": "true",
+ "Suggests": "Cairo, covr, dplyr, forcats, gridGraphics (>= 0.4-0), knitr,\nlattice, magick, maps, PASWR, patchwork, rmarkdown, ragg,\ntestthat (>= 1.0.0), tidyr, vdiffr (>= 0.3.0), VennDiagram",
+ "VignetteBuilder": "knitr",
+ "Collate": "'add_sub.R' 'align_plots.R' 'as_grob.R' 'as_gtable.R'\n'axis_canvas.R' 'cowplot.R' 'draw.R' 'get_plot_component.R'\n'get_axes.R' 'get_titles.R' 'get_legend.R' 'get_panel.R'\n'gtable.R' 'key_glyph.R' 'plot_grid.R' 'save.R'\n'set_null_device.R' 'setup.R' 'stamp.R' 'themes.R'\n'utils_ggplot2.R'",
+ "RoxygenNote": "7.1.1",
+ "Encoding": "UTF-8",
+ "NeedsCompilation": "no",
+ "Packaged": "2020-12-15 18:32:06 UTC; clauswilke",
+ "Author": "Claus O. Wilke [aut, cre] ()",
+ "Maintainer": "Claus O. Wilke ",
+ "Repository": "CRAN",
+ "Date/Publication": "2020-12-30 14:30:02 UTC",
+ "Built": "R 4.2.0; ; 2022-04-27 21:59:10 UTC; unix"
+ }
+ },
+ "cpp11": {
+ "Source": "CRAN",
+ "Repository": "https://cran.rstudio.com",
+ "description": {
+ "Package": "cpp11",
+ "Title": "A C++11 Interface for R's C Interface",
+ "Version": "0.4.7",
+ "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 (>= 3.5.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.2.3",
+ "NeedsCompilation": "no",
+ "Packaged": "2023-12-01 19:16:04 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": "CRAN",
+ "Date/Publication": "2023-12-02 13:20:02 UTC",
+ "Built": "R 4.2.0; ; 2023-12-21 01:48:14 UTC; unix"
+ }
+ },
+ "crayon": {
+ "Source": "CRAN",
+ "Repository": "https://cran.rstudio.com",
+ "description": {
+ "Package": "crayon",
+ "Title": "Colored Terminal Output",
+ "Version": "1.5.2",
+ "Authors@R": "c(\n person(\"Gábor\", \"Csárdi\", , \"csardi.gabor@gmail.com\",\n role = c(\"aut\", \"cre\")),\n person(\n \"Brodie\", \"Gaslam\", email=\"brodie.gaslam@yahoo.com\",\n role=c(\"ctb\"))\n )",
+ "Description": "The crayon package is now superseded. Please use the 'cli' package\n for new projects.\n Colored terminal output on terminals that support 'ANSI'\n color and highlight codes. It also works in 'Emacs' 'ESS'. 'ANSI'\n color support is automatically detected. Colors and highlighting can\n be combined and nested. New styles can also be created easily.\n This package was inspired by the 'chalk' 'JavaScript' project.",
+ "License": "MIT + file LICENSE",
+ "URL": "https://github.com/r-lib/crayon#readme",
+ "BugReports": "https://github.com/r-lib/crayon/issues",
+ "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'",
+ "Imports": "grDevices, methods, utils",
+ "Suggests": "mockery, rstudioapi, testthat, withr",
+ "RoxygenNote": "7.1.2",
+ "Encoding": "UTF-8",
+ "NeedsCompilation": "no",
+ "Packaged": "2022-09-29 06:24:10 UTC; gaborcsardi",
+ "Author": "Gábor Csárdi [aut, cre],\n Brodie Gaslam [ctb]",
+ "Maintainer": "Gábor Csárdi ",
+ "Repository": "CRAN",
+ "Date/Publication": "2022-09-29 16:20:24 UTC",
+ "Built": "R 4.2.0; ; 2022-09-30 11:58:06 UTC; unix"
+ }
+ },
+ "credentials": {
+ "Source": "CRAN",
+ "Repository": "https://cran.rstudio.com",
+ "description": {
+ "Package": "credentials",
+ "Type": "Package",
+ "Title": "Tools for Managing SSH and Git Credentials",
+ "Version": "1.3.2",
+ "Authors@R": "person(\"Jeroen\", \"Ooms\", role = c(\"aut\", \"cre\"), \n email = \"jeroen@berkeley.edu\", comment = c(ORCID = \"0000-0002-4035-0289\"))",
+ "Description": "Setup and retrieve HTTPS and SSH credentials for use with 'git' and \n other services. For HTTPS remotes the package interfaces the 'git-credential' \n utility which 'git' uses to store HTTP usernames and passwords. For SSH \n remotes we provide convenient functions to find or generate appropriate SSH \n keys. The package both helps the user to setup a local git installation, and\n also provides a back-end for git/ssh client libraries to authenticate with \n existing user credentials.",
+ "License": "MIT + file LICENSE",
+ "SystemRequirements": "git (optional)",
+ "Encoding": "UTF-8",
+ "Imports": "openssl (>= 1.3), sys (>= 2.1), curl, jsonlite, askpass",
+ "Suggests": "testthat, knitr, rmarkdown",
+ "RoxygenNote": "7.1.1",
+ "VignetteBuilder": "knitr",
+ "Language": "en-US",
+ "URL": "https://docs.ropensci.org/credentials/ (website)\nhttps://github.com/r-lib/credentials",
+ "BugReports": "https://github.com/r-lib/credentials/issues",
+ "NeedsCompilation": "no",
+ "Packaged": "2021-11-29 11:40:26 UTC; jeroen",
+ "Author": "Jeroen Ooms [aut, cre] ()",
+ "Maintainer": "Jeroen Ooms ",
+ "Repository": "CRAN",
+ "Date/Publication": "2021-11-29 12:40:01 UTC",
+ "Built": "R 4.2.0; ; 2022-04-26 22:47:16 UTC; unix"
+ }
+ },
+ "crosstalk": {
+ "Source": "CRAN",
+ "Repository": "https://cran.rstudio.com",
+ "description": {
+ "Package": "crosstalk",
+ "Type": "Package",
+ "Title": "Inter-Widget Interactivity for HTML Widgets",
+ "Version": "1.2.0",
+ "Authors@R": "c(\n person(\"Joe\", \"Cheng\", role = \"aut\", email = \"joe@rstudio.com\"),\n person(\"Carson\", \"Sievert\", role = c(\"aut\", \"cre\"),\n email = \"carson@rstudio.com\", comment = c(ORCID = \"0000-0002-4958-2844\")),\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/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/",
+ "BugReports": "https://github.com/rstudio/crosstalk/issues",
+ "RoxygenNote": "7.1.1",
+ "Encoding": "UTF-8",
+ "NeedsCompilation": "no",
+ "Packaged": "2021-11-04 15:35:47 UTC; cpsievert",
+ "Author": "Joe Cheng [aut],\n Carson Sievert [aut, cre] (),\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/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": "CRAN",
+ "Date/Publication": "2021-11-04 16:30:02 UTC",
+ "Built": "R 4.2.0; ; 2022-04-26 22:34:05 UTC; unix"
+ }
+ },
+ "curl": {
+ "Source": "CRAN",
+ "Repository": "https://cran.rstudio.com",
+ "description": {
+ "Package": "curl",
+ "Type": "Package",
+ "Title": "A Modern and Flexible Web Client for R",
+ "Version": "5.2.0",
+ "Authors@R": "c(\n person(\"Jeroen\", \"Ooms\", role = c(\"aut\", \"cre\"), email = \"jeroen@berkeley.edu\",\n comment = c(ORCID = \"0000-0002-4035-0289\")),\n person(\"Hadley\", \"Wickham\", , \"hadley@rstudio.com\", role = \"ctb\"),\n person(\"RStudio\", role = \"cph\")\n )",
+ "Description": "The curl() and curl_download() functions provide highly\n configurable drop-in replacements for base url() and download.file() with\n better performance, support for encryption (https, ftps), gzip compression,\n authentication, and other 'libcurl' goodies. The core of the package implements a\n framework for performing fully customized requests where data can be processed\n either in memory, on disk, or streaming via the callback or connection\n interfaces. Some knowledge of 'libcurl' is recommended; for a more-user-friendly\n web client see the 'httr' package which builds on this package with http\n specific tools and logic.",
+ "License": "MIT + file LICENSE",
+ "SystemRequirements": "libcurl: libcurl-devel (rpm) or\nlibcurl4-openssl-dev (deb).",
+ "URL": "https://jeroen.r-universe.dev/curl https://curl.se/libcurl/",
+ "BugReports": "https://github.com/jeroen/curl/issues",
+ "Suggests": "spelling, testthat (>= 1.0.0), knitr, jsonlite, later,\nrmarkdown, magrittr, httpuv (>= 1.4.4), webutils",
+ "VignetteBuilder": "knitr",
+ "Depends": "R (>= 3.0.0)",
+ "RoxygenNote": "7.2.3",
+ "Encoding": "UTF-8",
+ "Language": "en-US",
+ "NeedsCompilation": "yes",
+ "Packaged": "2023-12-07 23:07:08 UTC; jeroen",
+ "Author": "Jeroen Ooms [aut, cre] (),\n Hadley Wickham [ctb],\n RStudio [cph]",
+ "Maintainer": "Jeroen Ooms ",
+ "Repository": "CRAN",
+ "Date/Publication": "2023-12-08 07:30:02 UTC",
+ "Built": "R 4.2.0; x86_64-apple-darwin17.0; 2023-12-21 11:25:04 UTC; unix",
+ "Archs": "curl.so.dSYM"
+ }
+ },
+ "data.table": {
+ "Source": "CRAN",
+ "Repository": "https://cran.rstudio.com",
+ "description": {
+ "Package": "data.table",
+ "Version": "1.14.6",
+ "Title": "Extension of `data.frame`",
+ "Authors@R": "c(\n person(\"Matt\",\"Dowle\", role=c(\"aut\",\"cre\"), email=\"mattjdowle@gmail.com\"),\n person(\"Arun\",\"Srinivasan\", role=\"aut\", email=\"asrini@pm.me\"),\n person(\"Jan\",\"Gorecki\", role=\"ctb\"),\n person(\"Michael\",\"Chirico\", role=\"ctb\"),\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(\"Toby\",\"Hocking\", role=\"ctb\"),\n person(\"Leonardo\",\"Silvestri\", role=\"ctb\"),\n person(\"Tyson\",\"Barrett\", 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(\"Ben\",\"Schwen\", role=\"ctb\"))",
+ "Depends": "R (>= 3.1.0)",
+ "Imports": "methods",
+ "Suggests": "bit64 (>= 4.0.0), bit (>= 4.0.4), curl, R.utils, xts,\nnanotime, zoo (>= 1.8-1), yaml, knitr, rmarkdown",
+ "SystemRequirements": "zlib",
+ "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",
+ "ByteCompile": "TRUE",
+ "NeedsCompilation": "yes",
+ "Packaged": "2022-11-16 05:53:37 UTC; mdowle",
+ "Author": "Matt Dowle [aut, cre],\n Arun Srinivasan [aut],\n Jan Gorecki [ctb],\n Michael Chirico [ctb],\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 Toby Hocking [ctb],\n Leonardo Silvestri [ctb],\n Tyson Barrett [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 Ben Schwen [ctb]",
+ "Maintainer": "Matt Dowle ",
+ "Repository": "CRAN",
+ "Date/Publication": "2022-11-16 21:30:02 UTC",
+ "Built": "R 4.2.0; x86_64-apple-darwin17.0; 2022-11-17 13:18:30 UTC; unix",
+ "Archs": "data_table.so.dSYM"
+ }
+ },
+ "dbplyr": {
+ "Source": "CRAN",
+ "Repository": "https://cran.rstudio.com",
+ "description": {
+ "Type": "Package",
+ "Package": "dbplyr",
+ "Title": "A 'dplyr' Back End for Databases",
+ "Version": "2.2.1",
+ "Authors@R": "c(\n person(\"Hadley\", \"Wickham\", , \"hadley@rstudio.com\", role = c(\"aut\", \"cre\")),\n person(\"Maximilian\", \"Girlich\", role = \"aut\"),\n person(\"Edgar\", \"Ruiz\", role = \"aut\"),\n person(\"RStudio\", role = c(\"cph\", \"fnd\"))\n )",
+ "Description": "A 'dplyr' back end for databases that allows you to work with\n remote database tables as if they are in-memory data frames. Basic\n features works with any database that has a 'DBI' back end; more\n advanced features require 'SQL' translation to be provided by the\n package author.",
+ "License": "MIT + file LICENSE",
+ "URL": "https://dbplyr.tidyverse.org/, https://github.com/tidyverse/dbplyr",
+ "BugReports": "https://github.com/tidyverse/dbplyr/issues",
+ "Depends": "R (>= 3.1)",
+ "Imports": "assertthat (>= 0.2.0), blob (>= 1.2.0), cli (>= 3.3.0), DBI\n(>= 1.0.0), dplyr (>= 1.0.9), glue (>= 1.2.0), lifecycle (>=\n1.0.0), magrittr, methods, pillar (>= 1.5.0), purrr (>= 0.2.5),\nR6 (>= 2.2.2), rlang (>= 1.0.0), tibble (>= 1.4.2), tidyselect\n(>= 0.2.4), utils, vctrs (>= 0.4.1), withr",
+ "Suggests": "bit64, covr, knitr, Lahman, nycflights13, odbc, RMariaDB (>=\n1.0.2), rmarkdown, RPostgres (>= 1.1.3), RPostgreSQL, RSQLite\n(>= 2.1.0), testthat (>= 3.0.2), tidyr (>= 1.2.0)",
+ "VignetteBuilder": "knitr",
+ "Config/Needs/website": "tidyverse/tidytemplate",
+ "Config/testthat/edition": "3",
+ "Encoding": "UTF-8",
+ "Language": "en-gb",
+ "RoxygenNote": "7.2.0",
+ "Collate": "'utils.R' 'sql.R' 'escape.R' 'translate-sql-cut.R'\n'translate-sql-quantile.R' 'translate-sql-string.R'\n'translate-sql-paste.R' 'translate-sql-helpers.R'\n'translate-sql-window.R' 'translate-sql-conditional.R'\n'backend-.R' 'backend-access.R' 'backend-hana.R'\n'backend-hive.R' 'backend-impala.R' 'verb-copy-to.R'\n'backend-mssql.R' 'backend-mysql.R' 'backend-odbc.R'\n'backend-oracle.R' 'backend-postgres.R'\n'backend-postgres-old.R' 'backend-redshift.R'\n'backend-snowflake.R' 'backend-sqlite.R' 'backend-teradata.R'\n'build-sql.R' 'data-cache.R' 'data-lahman.R'\n'data-nycflights13.R' 'db-escape.R' 'db-io.R' 'db-sql.R' 'db.R'\n'dbplyr.R' 'explain.R' 'ident.R' 'lazy-join-query.R'\n'lazy-ops.R' 'lazy-query.R' 'lazy-select-query.R'\n'lazy-set-op-query.R' 'memdb.R' 'pillar.R' 'progress.R'\n'query-join.R' 'query-select.R' 'query-semi-join.R'\n'query-set-op.R' 'query.R' 'reexport.R' 'remote.R' 'rows.R'\n'schema.R' 'simulate.R' 'sql-build.R' 'sql-clause.R'\n'sql-expr.R' 'src-sql.R' 'src_dbi.R' 'tbl-lazy.R' 'tbl-sql.R'\n'test-frame.R' 'testthat.R' 'tidyeval-across.R' 'tidyeval.R'\n'translate-sql.R' 'utils-format.R' 'verb-arrange.R'\n'verb-compute.R' 'verb-count.R' 'verb-distinct.R'\n'verb-do-query.R' 'verb-do.R' 'verb-expand.R' 'verb-fill.R'\n'verb-filter.R' 'verb-group_by.R' 'verb-head.R' 'verb-joins.R'\n'verb-mutate.R' 'verb-pivot-longer.R' 'verb-pivot-wider.R'\n'verb-pull.R' 'verb-select.R' 'verb-set-ops.R' 'verb-slice.R'\n'verb-summarise.R' 'verb-uncount.R' 'verb-window.R' 'zzz.R'",
+ "NeedsCompilation": "no",
+ "Packaged": "2022-06-27 14:43:06 UTC; hadleywickham",
+ "Author": "Hadley Wickham [aut, cre],\n Maximilian Girlich [aut],\n Edgar Ruiz [aut],\n RStudio [cph, fnd]",
+ "Maintainer": "Hadley Wickham ",
+ "Repository": "CRAN",
+ "Date/Publication": "2022-06-27 15:20:07 UTC",
+ "Built": "R 4.2.0; ; 2022-06-28 12:08:36 UTC; unix"
+ }
+ },
+ "desc": {
+ "Source": "CRAN",
+ "Repository": "https://cran.rstudio.com",
+ "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": "CRAN",
+ "Date/Publication": "2023-12-10 11:40:08 UTC",
+ "Built": "R 4.2.0; ; 2023-12-21 02:02:52 UTC; unix",
+ "RemoteType": "standard",
+ "RemotePkgRef": "desc",
+ "RemoteRef": "desc",
+ "RemoteRepos": "https://cran.rstudio.com/",
+ "RemotePkgPlatform": "x86_64-apple-darwin17.0",
+ "RemoteSha": "1.4.3"
+ }
+ },
+ "devtools": {
+ "Source": "CRAN",
+ "Repository": "https://cran.rstudio.com",
+ "description": {
+ "Package": "devtools",
+ "Title": "Tools to Make Developing R Packages Easier",
+ "Version": "2.4.5",
+ "Authors@R": "c(\n person(\"Hadley\", \"Wickham\", role = \"aut\"),\n person(\"Jim\", \"Hester\", role = \"aut\"),\n person(\"Winston\", \"Chang\", role = \"aut\"),\n person(\"Jennifer\", \"Bryan\", , \"jenny@rstudio.com\", role = c(\"aut\", \"cre\"),\n comment = c(ORCID = \"0000-0002-6983-2759\")),\n person(\"RStudio\", role = c(\"cph\", \"fnd\"))\n )",
+ "Description": "Collection of package development tools.",
+ "License": "MIT + file LICENSE",
+ "URL": "https://devtools.r-lib.org/, https://github.com/r-lib/devtools",
+ "BugReports": "https://github.com/r-lib/devtools/issues",
+ "Depends": "R (>= 3.0.2), usethis (>= 2.1.6)",
+ "Imports": "cli (>= 3.3.0), desc (>= 1.4.1), ellipsis (>= 0.3.2), fs (>=\n1.5.2), lifecycle (>= 1.0.1), memoise (>= 2.0.1), miniUI (>=\n0.1.1.1), pkgbuild (>= 1.3.1), pkgdown (>= 2.0.6), pkgload (>=\n1.3.0), profvis (>= 0.3.7), rcmdcheck (>= 1.4.0), remotes (>=\n2.4.2), rlang (>= 1.0.4), roxygen2 (>= 7.2.1), rversions (>=\n2.1.1), sessioninfo (>= 1.2.2), stats, testthat (>= 3.1.5),\ntools, urlchecker (>= 1.0.1), utils, withr (>= 2.5.0)",
+ "Suggests": "BiocManager (>= 1.30.18), callr (>= 3.7.1), covr (>= 3.5.1),\ncurl (>= 4.3.2), digest (>= 0.6.29), DT (>= 0.23), foghorn (>=\n1.4.2), gh (>= 1.3.0), gmailr (>= 1.0.1), httr (>= 1.4.3),\nknitr (>= 1.39), lintr (>= 3.0.0), MASS, mockery (>= 0.4.3),\npingr (>= 2.0.1), rhub (>= 1.1.1), rmarkdown (>= 2.14),\nrstudioapi (>= 0.13), spelling (>= 2.2)",
+ "VignetteBuilder": "knitr",
+ "Config/Needs/website": "tidyverse/tidytemplate",
+ "Encoding": "UTF-8",
+ "Language": "en-US",
+ "RoxygenNote": "7.2.1",
+ "Config/testthat/edition": "3",
+ "NeedsCompilation": "no",
+ "Packaged": "2022-10-11 16:13:16 UTC; jenny",
+ "Author": "Hadley Wickham [aut],\n Jim Hester [aut],\n Winston Chang [aut],\n Jennifer Bryan [aut, cre] (),\n RStudio [cph, fnd]",
+ "Maintainer": "Jennifer Bryan ",
+ "Repository": "CRAN",
+ "Date/Publication": "2022-10-11 17:12:36 UTC",
+ "Built": "R 4.2.0; ; 2022-10-12 12:25:55 UTC; unix"
+ }
+ },
+ "diffobj": {
+ "Source": "CRAN",
+ "Repository": "https://cran.rstudio.com",
+ "description": {
+ "Package": "diffobj",
+ "Type": "Package",
+ "Title": "Diffs for R Objects",
+ "Description": "Generate a colorized diff of two R objects for an intuitive\n visualization of their differences.",
+ "Version": "0.3.5",
+ "Authors@R": "c(\n person(\n \"Brodie\", \"Gaslam\", email=\"brodie.gaslam@yahoo.com\",\n role=c(\"aut\", \"cre\")),\n person(\n \"Michael B.\", \"Allen\", email=\"ioplex@gmail.com\",\n role=c(\"ctb\", \"cph\"),\n comment=\"Original C implementation of Myers Diff Algorithm\"))",
+ "Depends": "R (>= 3.1.0)",
+ "License": "GPL-2 | GPL-3",
+ "URL": "https://github.com/brodieG/diffobj",
+ "BugReports": "https://github.com/brodieG/diffobj/issues",
+ "RoxygenNote": "7.1.1",
+ "VignetteBuilder": "knitr",
+ "Encoding": "UTF-8",
+ "Suggests": "knitr, rmarkdown",
+ "Collate": "'capt.R' 'options.R' 'pager.R' 'check.R' 'finalizer.R'\n'misc.R' 'html.R' 'styles.R' 's4.R' 'core.R' 'diff.R' 'get.R'\n'guides.R' 'hunks.R' 'layout.R' 'myerssimple.R' 'rdiff.R'\n'rds.R' 'set.R' 'subset.R' 'summmary.R' 'system.R' 'text.R'\n'tochar.R' 'trim.R' 'word.R'",
+ "Imports": "crayon (>= 1.3.2), tools, methods, utils, stats",
+ "NeedsCompilation": "yes",
+ "Packaged": "2021-10-05 01:16:56 UTC; bg",
+ "Author": "Brodie Gaslam [aut, cre],\n Michael B. Allen [ctb, cph] (Original C implementation of Myers Diff\n Algorithm)",
+ "Maintainer": "Brodie Gaslam ",
+ "Repository": "CRAN",
+ "Date/Publication": "2021-10-05 07:10:17 UTC",
+ "Built": "R 4.2.0; x86_64-apple-darwin17.0; 2022-04-25 03:56:14 UTC; unix",
+ "Archs": "diffobj.so.dSYM"
+ }
+ },
+ "digest": {
+ "Source": "CRAN",
+ "Repository": "https://cran.rstudio.com",
+ "description": {
+ "Package": "digest",
+ "Author": "Dirk Eddelbuettel with contributions\n by Antoine Lucas, Jarek Tuszynski, Henrik Bengtsson, Simon Urbanek,\n Mario Frasca, Bryan Lewis, Murray Stokely, Hannes Muehleisen,\n Duncan Murdoch, Jim Hester, Wush Wu, Qiang Kou, Thierry Onkelinx,\n Michel Lang, Viliam Simko, Kurt Hornik, Radford Neal, Kendon Bell,\n Matthew de Queljoe, Ion Suruceanu, Bill Denney, Dirk Schumacher,\n and Winston Chang.",
+ "Version": "0.6.31",
+ "Date": "2022-12-10",
+ "Maintainer": "Dirk Eddelbuettel ",
+ "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' and 'blake3' algorithms) permitting easy\n comparison of R language objects, as well as functions such as'hmac()' to\n create hash-based message authentication code. Please note that this package\n is not meant to be deployed for cryptographic purposes for which more\n comprehensive (and widely tested) libraries such as 'OpenSSL' should be\n used.",
+ "URL": "https://github.com/eddelbuettel/digest,\nhttp://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",
+ "NeedsCompilation": "yes",
+ "Packaged": "2022-12-10 18:30:14 UTC; edd",
+ "Repository": "CRAN",
+ "Date/Publication": "2022-12-11 07:40:02 UTC",
+ "Built": "R 4.2.0; x86_64-apple-darwin17.0; 2022-12-12 12:22:51 UTC; unix",
+ "Archs": "digest.so.dSYM"
+ }
+ },
+ "downlit": {
+ "Source": "CRAN",
+ "Repository": "https://cran.rstudio.com",
+ "description": {
+ "Package": "downlit",
+ "Title": "Syntax Highlighting and Automatic Linking",
+ "Version": "0.4.2",
+ "Authors@R": "c(\n person(\"Hadley\", \"Wickham\", , \"hadley@rstudio.com\", role = c(\"aut\", \"cre\")),\n person(\"RStudio\", role = c(\"cph\", \"fnd\"))\n )",
+ "Description": "Syntax highlighting of R code, specifically designed for the\n needs of 'RMarkdown' packages like 'pkgdown', 'hugodown', and\n 'bookdown'. It includes linking of function calls to their\n documentation on the web, and automatic translation of ANSI escapes in\n output to the equivalent HTML.",
+ "License": "MIT + file LICENSE",
+ "URL": "https://downlit.r-lib.org/, https://github.com/r-lib/downlit",
+ "BugReports": "https://github.com/r-lib/downlit/issues",
+ "Depends": "R (>= 3.4.0)",
+ "Imports": "brio, desc, digest, evaluate, fansi, memoise, rlang, vctrs,\nwithr, yaml",
+ "Suggests": "covr, htmltools, jsonlite, MASS, MassSpecWavelet, pkgload,\nrmarkdown, testthat (>= 3.0.0), xml2",
+ "Config/Needs/website": "tidyverse/tidytemplate",
+ "Config/testthat/edition": "3",
+ "Encoding": "UTF-8",
+ "RoxygenNote": "7.2.0",
+ "NeedsCompilation": "no",
+ "Packaged": "2022-07-05 02:12:58 UTC; hadleywickham",
+ "Author": "Hadley Wickham [aut, cre],\n RStudio [cph, fnd]",
+ "Maintainer": "Hadley Wickham ",
+ "Repository": "CRAN",
+ "Date/Publication": "2022-07-05 03:00:02 UTC",
+ "Built": "R 4.2.0; ; 2022-07-05 11:50:24 UTC; unix"
+ }
+ },
+ "dpkg": {
+ "Source": "github",
+ "Repository": null,
+ "description": {
+ "Package": "dpkg",
+ "Title": "Create, Stow, and Read Data Packages",
+ "Version": "0.5.1",
+ "Authors@R": "\n person(\"Cole\", \"Brokamp\", , \"cole@colebrokamp.com\", role = c(\"aut\", \"cre\"),\n comment = c(ORCID = \"0000-0002-0289-3151\"))",
+ "Description": "Data frame, tibble, or tbl objects are converted to data package objects using specific metadata labels (name, version, title, homepage, description). A data package object (`dpkg`) can be written to disk as a 'parquet' file and uploaded to a 'Amazon Web Service' (AWS) 'Simple Storage Service' (S3) bucket or to a 'GitHub' release. Data package objects can be read into R from online repositories and the downloaded 'parquet' files are cached locally in the R user data directory.",
+ "License": "MIT + file LICENSE",
+ "Encoding": "UTF-8",
+ "Roxygen": "list(markdown = TRUE)",
+ "RoxygenNote": "7.3.2",
+ "Suggests": "dplyr, geoarrow, gert, gh, sf, testthat (>= 3.0.0), usethis,\nwithr",
+ "Config/testthat/edition": "3",
+ "URL": "https://github.com/cole-brokamp/dpkg,\nhttps://cole-brokamp.github.io/dpkg/",
+ "BugReports": "https://github.com/cole-brokamp/dpkg/issues",
+ "Imports": "arrow, cli, fs, glue, httr2, rlang, tibble",
+ "NeedsCompilation": "no",
+ "Packaged": "2024-09-06 14:21:13 UTC; vanug6",
+ "Author": "Cole Brokamp [aut, cre] ()",
+ "Maintainer": "Cole Brokamp ",
+ "Built": "R 4.2.2; ; 2024-09-06 14:21:14 UTC; unix",
+ "RemoteType": "github",
+ "RemoteHost": "api.github.com",
+ "RemoteRepo": "dpkg",
+ "RemoteUsername": "cole-brokamp",
+ "RemotePkgRef": "cole-brokamp/dpkg",
+ "RemoteRef": "HEAD",
+ "RemoteSha": "718254abf324b8b13300a65922673ee838c972ad",
+ "GithubRepo": "dpkg",
+ "GithubUsername": "cole-brokamp",
+ "GithubRef": "HEAD",
+ "GithubSHA1": "718254abf324b8b13300a65922673ee838c972ad"
+ }
+ },
+ "dplyr": {
+ "Source": "CRAN",
+ "Repository": "https://cran.rstudio.com",
+ "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": "CRAN",
+ "Date/Publication": "2023-11-17 16:50:02 UTC",
+ "Built": "R 4.2.0; x86_64-apple-darwin17.0; 2023-12-21 16:49:49 UTC; unix",
+ "Archs": "dplyr.so.dSYM"
+ }
+ },
+ "dtplyr": {
+ "Source": "CRAN",
+ "Repository": "https://cran.rstudio.com",
+ "description": {
+ "Package": "dtplyr",
+ "Title": "Data Table Back-End for 'dplyr'",
+ "Version": "1.2.2",
+ "Authors@R": "c(\n person(\"Hadley\", \"Wickham\", , \"hadley@rstudio.com\", role = c(\"cre\", \"aut\")),\n person(\"Maximilian\", \"Girlich\", role = \"aut\"),\n person(\"Mark\", \"Fairbanks\", role = \"aut\"),\n person(\"Ryan\", \"Dickerson\", role = \"aut\"),\n person(\"RStudio\", role = c(\"cph\", \"fnd\"))\n )",
+ "Description": "Provides a data.table backend for 'dplyr'. The goal of\n 'dtplyr' is to allow you to write 'dplyr' code that is automatically\n translated to the equivalent, but usually much faster, data.table\n code.",
+ "License": "MIT + file LICENSE",
+ "URL": "https://dtplyr.tidyverse.org, https://github.com/tidyverse/dtplyr",
+ "BugReports": "https://github.com/tidyverse/dtplyr/issues",
+ "Depends": "R (>= 3.3)",
+ "Imports": "crayon, data.table (>= 1.13.0), dplyr (>= 1.0.3), ellipsis,\nglue, lifecycle, rlang, tibble, tidyselect, vctrs",
+ "Suggests": "bench, covr, knitr, rmarkdown, testthat (>= 3.0.0), tidyr (>=\n1.1.0)",
+ "VignetteBuilder": "knitr",
+ "Config/Needs/website": "tidyverse/tidytemplate",
+ "Config/testthat/edition": "3",
+ "Encoding": "UTF-8",
+ "RoxygenNote": "7.2.1",
+ "NeedsCompilation": "no",
+ "Packaged": "2022-08-20 12:54:11 UTC; hadleywickham",
+ "Author": "Hadley Wickham [cre, aut],\n Maximilian Girlich [aut],\n Mark Fairbanks [aut],\n Ryan Dickerson [aut],\n RStudio [cph, fnd]",
+ "Maintainer": "Hadley Wickham ",
+ "Repository": "CRAN",
+ "Date/Publication": "2022-08-20 13:20:02 UTC",
+ "Built": "R 4.2.0; ; 2022-08-21 11:53:27 UTC; unix"
+ }
+ },
+ "e1071": {
+ "Source": "CRAN",
+ "Repository": "https://cran.rstudio.com",
+ "description": {
+ "Package": "e1071",
+ "Version": "1.7-14",
+ "Title": "Misc Functions of the Department of Statistics, Probability\nTheory Group (Formerly: E1071), TU Wien",
+ "Imports": "graphics, grDevices, class, stats, methods, utils, proxy",
+ "Suggests": "cluster, mlbench, nnet, randomForest, rpart, SparseM, xtable,\nMatrix, MASS, slam",
+ "Authors@R": "c(person(given = \"David\", family = \"Meyer\", role = c(\"aut\", \"cre\"),\n email = \"David.Meyer@R-project.org\",\n\t\t comment = c(ORCID = \"0000-0002-5196-3048\")), \n person(given = \"Evgenia\", family = \"Dimitriadou\", role = c(\"aut\",\"cph\")),\n person(given = \"Kurt\", family = \"Hornik\", role = \"aut\",\n\t email = \"Kurt.Hornik@R-project.org\",\n comment = c(ORCID = \"0000-0003-4198-9911\")),\n person(given = \"Andreas\", family = \"Weingessel\", role = \"aut\"),\n person(given = \"Friedrich\", family = \"Leisch\", role = \"aut\"),\n person(given = \"Chih-Chung\", family = \"Chang\", role = c(\"ctb\",\"cph\"), comment = \"libsvm C++-code\"),\n person(given = \"Chih-Chen\", family = \"Lin\", role = c(\"ctb\",\"cph\"), comment = \"libsvm C++-code\"))",
+ "Description": "Functions for latent class analysis, short time Fourier\n\t transform, fuzzy clustering, support vector machines,\n\t shortest path computation, bagged clustering, naive Bayes\n\t classifier, generalized k-nearest neighbour ...",
+ "License": "GPL-2 | GPL-3",
+ "LazyLoad": "yes",
+ "NeedsCompilation": "yes",
+ "Packaged": "2023-12-05 17:29:44 UTC; meyer",
+ "Author": "David Meyer [aut, cre] (),\n Evgenia Dimitriadou [aut, cph],\n Kurt Hornik [aut] (),\n Andreas Weingessel [aut],\n Friedrich Leisch [aut],\n Chih-Chung Chang [ctb, cph] (libsvm C++-code),\n Chih-Chen Lin [ctb, cph] (libsvm C++-code)",
+ "Maintainer": "David Meyer ",
+ "Repository": "CRAN",
+ "Date/Publication": "2023-12-06 09:22:29 UTC",
+ "Built": "R 4.2.0; x86_64-apple-darwin17.0; 2023-12-21 07:38:20 UTC; unix",
+ "Archs": "e1071.so.dSYM"
+ }
+ },
+ "ellipsis": {
+ "Source": "CRAN",
+ "Repository": "https://cran.rstudio.com",
+ "description": {
+ "Package": "ellipsis",
+ "Version": "0.3.2",
+ "Title": "Tools for Working with ...",
+ "Description": "The ellipsis is a powerful tool for extending functions. Unfortunately \n this power comes at a cost: misspelled arguments will be silently ignored. \n The ellipsis package provides a collection of functions to catch problems\n and alert the user.",
+ "Authors@R": "c(\n person(\"Hadley\", \"Wickham\", , \"hadley@rstudio.com\", role = c(\"aut\", \"cre\")),\n person(\"RStudio\", role = \"cph\")\n )",
+ "License": "MIT + file LICENSE",
+ "Encoding": "UTF-8",
+ "RoxygenNote": "7.1.1",
+ "URL": "https://ellipsis.r-lib.org, https://github.com/r-lib/ellipsis",
+ "BugReports": "https://github.com/r-lib/ellipsis/issues",
+ "Depends": "R (>= 3.2)",
+ "Imports": "rlang (>= 0.3.0)",
+ "Suggests": "covr, testthat",
+ "NeedsCompilation": "yes",
+ "Packaged": "2021-04-29 12:06:44 UTC; lionel",
+ "Author": "Hadley Wickham [aut, cre],\n RStudio [cph]",
+ "Maintainer": "Hadley Wickham ",
+ "Repository": "CRAN",
+ "Date/Publication": "2021-04-29 12:40:02 UTC",
+ "Built": "R 4.2.0; x86_64-apple-darwin17.0; 2022-04-25 03:08:12 UTC; unix",
+ "Archs": "ellipsis.so.dSYM"
+ }
+ },
+ "evaluate": {
+ "Source": "CRAN",
+ "Repository": "https://cran.rstudio.com",
+ "description": {
+ "Package": "evaluate",
+ "Type": "Package",
+ "Title": "Parsing and Evaluation Tools that Provide More Details than the\nDefault",
+ "Version": "0.20",
+ "Authors@R": "c(\n person(\"Hadley\", \"Wickham\", role = \"aut\"),\n person(\"Yihui\", \"Xie\", role = c(\"aut\", \"cre\"), email = \"xie@yihui.name\", 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 )",
+ "Description": "Parsing and evaluation tools that make it easy to recreate the\n command line behaviour of R.",
+ "License": "MIT + file LICENSE",
+ "URL": "https://github.com/r-lib/evaluate",
+ "BugReports": "https://github.com/r-lib/evaluate/issues",
+ "Depends": "R (>= 3.0.2)",
+ "Imports": "methods",
+ "Suggests": "covr, ggplot2, lattice, testthat",
+ "RoxygenNote": "7.2.3",
+ "Encoding": "UTF-8",
+ "NeedsCompilation": "no",
+ "Packaged": "2023-01-17 19:08:31 UTC; yihui",
+ "Author": "Hadley Wickham [aut],\n Yihui Xie [aut, cre] (),\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]",
+ "Maintainer": "Yihui Xie ",
+ "Repository": "CRAN",
+ "Date/Publication": "2023-01-17 20:20:02 UTC",
+ "Built": "R 4.2.0; ; 2023-01-18 13:09:44 UTC; unix"
+ }
+ },
+ "fansi": {
+ "Source": "CRAN",
+ "Repository": "https://cran.rstudio.com",
+ "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": "CRAN",
+ "Date/Publication": "2023-12-08 03:30:02 UTC",
+ "Built": "R 4.2.0; x86_64-apple-darwin17.0; 2023-12-21 01:43:44 UTC; unix",
+ "Archs": "fansi.so.dSYM"
+ }
+ },
+ "farver": {
+ "Source": "CRAN",
+ "Repository": "https://cran.rstudio.com",
+ "description": {
+ "Type": "Package",
+ "Package": "farver",
+ "Title": "High Performance Colour Space Manipulation",
+ "Version": "2.1.1",
+ "Authors@R": "c(\n person(\"Thomas Lin\", \"Pedersen\", , \"thomasp85@gmail.com\", 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 )",
+ "Maintainer": "Thomas Lin Pedersen ",
+ "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)",
+ "Encoding": "UTF-8",
+ "RoxygenNote": "7.2.0",
+ "SystemRequirements": "C++11",
+ "Config/testthat/edition": "3",
+ "NeedsCompilation": "yes",
+ "Packaged": "2022-07-06 12:54:24 UTC; thomas",
+ "Author": "Thomas Lin Pedersen [cre, aut]\n (),\n Berendea Nicolae [aut] (Author of the ColorSpace C++ library),\n Romain François [aut] ()",
+ "Repository": "CRAN",
+ "Date/Publication": "2022-07-06 13:50:02 UTC",
+ "Built": "R 4.2.0; x86_64-apple-darwin17.0; 2022-07-07 11:24:33 UTC; unix",
+ "Archs": "farver.so.dSYM"
+ }
+ },
+ "fastmap": {
+ "Source": "CRAN",
+ "Repository": "https://cran.rstudio.com",
+ "description": {
+ "Package": "fastmap",
+ "Title": "Fast Data Structures",
+ "Version": "1.1.1",
+ "Authors@R": "c(\n person(\"Winston\", \"Chang\", email = \"winston@rstudio.com\", role = c(\"aut\", \"cre\")),\n person(given = \"RStudio\", 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": "2023-02-24 16:01:27 UTC; winston",
+ "Author": "Winston Chang [aut, cre],\n RStudio [cph, fnd],\n Tessil [cph] (hopscotch_map library)",
+ "Maintainer": "Winston Chang ",
+ "Repository": "CRAN",
+ "Date/Publication": "2023-02-24 16:30:02 UTC",
+ "Built": "R 4.2.0; x86_64-apple-darwin17.0; 2023-02-25 13:06:28 UTC; unix",
+ "Archs": "fastmap.so.dSYM"
+ }
+ },
+ "fontawesome": {
+ "Source": "CRAN",
+ "Repository": "https://cran.rstudio.com",
+ "description": {
+ "Type": "Package",
+ "Package": "fontawesome",
+ "Version": "0.4.0",
+ "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@rstudio.com\", c(\"aut\", \"cre\"),\n comment = c(ORCID = \"0000-0003-3925-190X\")),\n person(\"Christophe\", \"Dervieux\", , \"cderv@rstudio.com\", role = \"ctb\",\n comment = c(ORCID = \"0000-0003-4474-2498\")),\n person(\"Winston\", \"Chang\", , \"winston@rstudio.com\", role = \"ctb\"),\n person(\"Dave\", \"Gandy\", role = c(\"ctb\", \"cph\"),\n comment = \"Font-Awesome font\"),\n person(\"RStudio\", 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.2.1",
+ "Depends": "R (>= 3.3.0)",
+ "Imports": "rlang (>= 0.4.10), htmltools (>= 0.5.1.1)",
+ "Suggests": "covr, dplyr (>= 1.0.8), knitr (>= 1.31), testthat (>= 3.0.0),\nrsvg",
+ "Config/testthat/edition": "3",
+ "NeedsCompilation": "no",
+ "Packaged": "2022-10-20 03:44:14 UTC; rich",
+ "Author": "Richard Iannone [aut, cre] (),\n Christophe Dervieux [ctb] (),\n Winston Chang [ctb],\n Dave Gandy [ctb, cph] (Font-Awesome font),\n RStudio [cph, fnd]",
+ "Maintainer": "Richard Iannone ",
+ "Repository": "CRAN",
+ "Date/Publication": "2022-10-25 12:35:07 UTC",
+ "Built": "R 4.2.0; ; 2022-10-26 11:51:24 UTC; unix"
+ }
+ },
+ "forcats": {
+ "Source": "CRAN",
+ "Repository": "https://cran.rstudio.com",
+ "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": "CRAN",
+ "Date/Publication": "2023-01-29 22:20:02 UTC",
+ "Built": "R 4.2.0; ; 2023-01-31 14:08:58 UTC; unix"
+ }
+ },
+ "fr": {
+ "Source": "github",
+ "Repository": null,
+ "description": {
+ "Package": "fr",
+ "Title": "Frictionless Standards",
+ "Version": "0.5.1",
+ "Authors@R": "\n person(\"Cole\", \"Brokamp\", , \"cole@colebrokamp.com\", role = c(\"aut\", \"cre\", \"cph\"),\n comment = c(ORCID = \"0000-0002-0289-3151\"))",
+ "Description": "A \"tabular-data-resource\" () is a simple format to describe a singular tabular data resource such as a CSV file. It includes support both for metadata such as author and title and a schema to describe the data, for example the types of the fields/columns in the data. Create a tabular-data-resource by providing a data.frame and specifying metadata. Write and read tabular-data-resources to and from disk. ",
+ "License": "MIT + file LICENSE",
+ "Encoding": "UTF-8",
+ "Roxygen": "list(markdown = TRUE)",
+ "RoxygenNote": "7.2.3",
+ "Imports": "cli, purrr, vroom, S7 (>= 0.1.1), tibble, tidyselect, yaml,\ndplyr, rlang",
+ "Suggests": "testthat (>= 3.0.0), withr, fs, knitr, rmarkdown",
+ "Config/testthat/edition": "3",
+ "Config/testthat/parallel": "true",
+ "URL": "https://github.com/cole-brokamp/fr,\nhttps://cole-brokamp.github.io/fr/",
+ "BugReports": "https://github.com/cole-brokamp/fr/issues",
+ "VignetteBuilder": "knitr",
+ "NeedsCompilation": "no",
+ "Packaged": "2024-06-14 17:00:34 UTC; vanug6",
+ "Author": "Cole Brokamp [aut, cre, cph] ()",
+ "Maintainer": "Cole Brokamp ",
+ "Built": "R 4.2.2; ; 2024-06-14 17:00:36 UTC; unix",
+ "RemoteType": "github",
+ "RemoteHost": "api.github.com",
+ "RemoteRepo": "fr",
+ "RemoteUsername": "cole-brokamp",
+ "RemotePkgRef": "cole-brokamp/fr",
+ "RemoteRef": "HEAD",
+ "RemoteSha": "e6fc0a9a12f1bbde668987f6f433f0af11e8b87e",
+ "GithubRepo": "fr",
+ "GithubUsername": "cole-brokamp",
+ "GithubRef": "HEAD",
+ "GithubSHA1": "e6fc0a9a12f1bbde668987f6f433f0af11e8b87e"
+ }
+ },
+ "fs": {
+ "Source": "CRAN",
+ "Repository": "https://cran.rstudio.com",
+ "description": {
+ "Package": "fs",
+ "Title": "Cross-Platform File System Operations Based on 'libuv'",
+ "Version": "1.6.3",
+ "Authors@R": "c(\n person(\"Jim\", \"Hester\", role = \"aut\"),\n person(\"Hadley\", \"Wickham\", , \"hadley@rstudio.com\", 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(\"RStudio\", 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.4)",
+ "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",
+ "Copyright": "file COPYRIGHTS",
+ "Encoding": "UTF-8",
+ "Language": "en-US",
+ "RoxygenNote": "7.2.3",
+ "SystemRequirements": "GNU make",
+ "Config/testthat/edition": "3",
+ "Config/Needs/website": "tidyverse/tidytemplate",
+ "NeedsCompilation": "yes",
+ "Packaged": "2023-07-10 16:24:00 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 RStudio [cph, fnd]",
+ "Maintainer": "Gábor Csárdi ",
+ "Repository": "CRAN",
+ "Date/Publication": "2023-07-20 10:30:02 UTC",
+ "Built": "R 4.2.0; x86_64-apple-darwin17.0; 2023-07-21 10:24:23 UTC; unix",
+ "Archs": "fs.so.dSYM"
+ }
+ },
+ "gargle": {
+ "Source": "CRAN",
+ "Repository": "https://cran.rstudio.com",
+ "description": {
+ "Package": "gargle",
+ "Title": "Utilities for Working with Google APIs",
+ "Version": "1.2.1",
+ "Authors@R": "c(\n person(\"Jennifer\", \"Bryan\", , \"jenny@rstudio.com\", role = c(\"aut\", \"cre\"),\n comment = c(ORCID = \"0000-0002-6983-2759\")),\n person(\"Craig\", \"Citro\", , \"craigcitro@google.com\", role = \"aut\"),\n person(\"Hadley\", \"Wickham\", , \"hadley@rstudio.com\", role = \"aut\",\n comment = c(ORCID = \"0000-0003-4757-117X\")),\n person(\"Google Inc\", role = \"cph\"),\n person(\"RStudio\", role = c(\"cph\", \"fnd\"))\n )",
+ "Description": "Provides utilities for working with Google APIs\n . This includes\n functions and classes for handling common credential types and for\n preparing, executing, and processing HTTP requests.",
+ "License": "MIT + file LICENSE",
+ "URL": "https://gargle.r-lib.org, https://github.com/r-lib/gargle",
+ "BugReports": "https://github.com/r-lib/gargle/issues",
+ "Depends": "R (>= 3.5)",
+ "Imports": "cli (>= 3.0.0), fs (>= 1.3.1), glue (>= 1.3.0), httr (>=\n1.4.0), jsonlite, rappdirs, rlang (>= 1.0.0), rstudioapi,\nstats, utils, withr",
+ "Suggests": "aws.ec2metadata, aws.signature, covr, httpuv, knitr, mockr,\nrmarkdown, sodium, spelling, testthat (>= 3.1.2)",
+ "VignetteBuilder": "knitr",
+ "Config/Needs/website": "tidyverse/tidytemplate",
+ "Config/testthat/edition": "3",
+ "Encoding": "UTF-8",
+ "Language": "en-US",
+ "RoxygenNote": "7.2.1",
+ "NeedsCompilation": "no",
+ "Packaged": "2022-09-08 02:31:22 UTC; jenny",
+ "Author": "Jennifer Bryan [aut, cre] (),\n Craig Citro [aut],\n Hadley Wickham [aut] (),\n Google Inc [cph],\n RStudio [cph, fnd]",
+ "Maintainer": "Jennifer Bryan ",
+ "Repository": "CRAN",
+ "Date/Publication": "2022-09-08 03:02:54 UTC",
+ "Built": "R 4.2.0; ; 2022-09-08 11:57:22 UTC; unix"
+ }
+ },
+ "generics": {
+ "Source": "CRAN",
+ "Repository": "https://cran.rstudio.com",
+ "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": "CRAN",
+ "Date/Publication": "2022-07-05 19:40:02 UTC",
+ "Built": "R 4.2.0; ; 2022-07-06 11:31:04 UTC; unix"
+ }
+ },
+ "gert": {
+ "Source": "CRAN",
+ "Repository": "https://cran.rstudio.com",
+ "description": {
+ "Type": "Package",
+ "Package": "gert",
+ "Title": "Simple Git Client for R",
+ "Version": "1.9.2",
+ "Authors@R": "c(\n person(\"Jeroen\", \"Ooms\", role = c(\"aut\", \"cre\"), email = \"jeroen@berkeley.edu\",\n comment = c(ORCID = \"0000-0002-4035-0289\")),\n person(\"Jennifer\", \"Bryan\", role = \"ctb\", email = \"jenny@rstudio.com\",\n comment = c(ORCID = \"0000-0002-6983-2759\")))",
+ "Description": "Simple git client for R based on 'libgit2' with\n support for SSH and HTTPS remotes. All functions in 'gert' use basic R data \n types (such as vectors and data-frames) for their arguments and return values.\n User credentials are shared with command line 'git' through the git-credential\n store and ssh keys stored on disk or ssh-agent.",
+ "License": "MIT + file LICENSE",
+ "URL": "https://docs.ropensci.org/gert/, https://github.com/r-lib/gert",
+ "BugReports": "https://github.com/r-lib/gert/issues",
+ "Imports": "askpass, credentials (>= 1.2.1), openssl (>= 2.0.3),\nrstudioapi (>= 0.11), sys, zip (>= 2.1.0)",
+ "Suggests": "spelling, knitr, rmarkdown, testthat",
+ "VignetteBuilder": "knitr",
+ "Encoding": "UTF-8",
+ "RoxygenNote": "7.2.1",
+ "SystemRequirements": "libgit2 (>= 1.0): libgit2-devel (rpm) or\nlibgit2-dev (deb)",
+ "Language": "en-US",
+ "NeedsCompilation": "yes",
+ "Packaged": "2022-12-05 23:16:35 UTC; jeroen",
+ "Author": "Jeroen Ooms [aut, cre] (),\n Jennifer Bryan [ctb] ()",
+ "Maintainer": "Jeroen Ooms ",
+ "Repository": "CRAN",
+ "Date/Publication": "2022-12-05 23:50:02 UTC",
+ "Built": "R 4.2.0; x86_64-apple-darwin17.0; 2022-12-06 12:50:49 UTC; unix",
+ "Archs": "gert.so.dSYM"
+ }
+ },
+ "ggExtra": {
+ "Source": "CRAN",
+ "Repository": "https://cran.rstudio.com",
+ "description": {
+ "Package": "ggExtra",
+ "Title": "Add Marginal Histograms to 'ggplot2', and More 'ggplot2'\nEnhancements",
+ "Version": "0.10.0",
+ "Authors@R": "c(\n person(\"Dean\", \"Attali\", , \"daattali@gmail.com\", role = c(\"aut\", \"cre\")),\n person(\"Christopher\", \"Baker\", , \"chriscrewbaker@gmail.com\", role = \"aut\")\n )",
+ "Description": "Collection of functions and layers to enhance 'ggplot2'. The \n flagship function is 'ggMarginal()', which can be used to add marginal\n histograms/boxplots/density plots to 'ggplot2' scatterplots.",
+ "URL": "https://github.com/daattali/ggExtra",
+ "BugReports": "https://github.com/daattali/ggExtra/issues",
+ "Depends": "R (>= 3.1.0)",
+ "Imports": "colourpicker (>= 1.0), ggplot2 (>= 2.2.0), grDevices, grid (>=\n3.1.3), gtable (>= 0.2.0), miniUI (>= 0.1.1), scales (>=\n0.2.0), shiny (>= 0.13.0), shinyjs (>= 0.5.2), utils, R6",
+ "Suggests": "knitr (>= 1.7), rmarkdown, rstudioapi (>= 0.5), testthat,\nvdiffr, fontquiver, shinydisconnect, svglite, withr, devtools",
+ "License": "MIT + file LICENSE",
+ "SystemRequirements": "pandoc with https support",
+ "VignetteBuilder": "knitr",
+ "RoxygenNote": "7.1.2",
+ "NeedsCompilation": "no",
+ "Packaged": "2022-03-23 14:54:41 UTC; Dean-X1C",
+ "Author": "Dean Attali [aut, cre],\n Christopher Baker [aut]",
+ "Maintainer": "Dean Attali ",
+ "Repository": "CRAN",
+ "Date/Publication": "2022-03-23 16:50:02 UTC",
+ "Built": "R 4.2.0; ; 2022-04-13 13:45:03 UTC; unix"
+ }
+ },
+ "ggiraph": {
+ "Source": "CRAN",
+ "Repository": "https://cran.rstudio.com",
+ "description": {
+ "Package": "ggiraph",
+ "Type": "Package",
+ "Title": "Make 'ggplot2' Graphics Interactive",
+ "Description": "Create interactive 'ggplot2' graphics using 'htmlwidgets'.",
+ "Version": "0.8.7",
+ "Authors@R": "c(\n person(\"David\", \"Gohel\", role = c(\"aut\", \"cre\"),\n email = \"david.gohel@ardata.fr\"),\n person(\"Panagiotis\", \"Skintzos\", role = c(\"aut\"),\n email = \"sigmapi@posteo.net\"),\n person(\"Mike\", \"Bostock\", role = c(\"cph\"),\n comment = \"d3.js\"), \n person(\"Speros\", \"Kokenes\", role = c(\"cph\"),\n comment = \"d3-lasso\"), \n person(\"Eric\", \"Shull\", role = c(\"cph\"),\n comment = \"saveSvgAsPng js library\"), \n person(\"Lee\", \"Thomason\", role = c(\"cph\"),\n comment = \"TinyXML2\"), \n person(\"Vladimir\", \"Agafonkin\", role = c(\"cph\"),\n comment = \"Flatbush\"), \n person(\"Eric\", \"Book\", role = c(\"ctb\"),\n comment = \"hline and vline geoms\")\n )",
+ "License": "GPL-3",
+ "Copyright": "See file COPYRIGHTS.",
+ "Encoding": "UTF-8",
+ "SystemRequirements": "libpng",
+ "Imports": "grid, ggplot2 (>= 3.4.0), htmlwidgets (>= 1.5), stats,\nhtmltools, Rcpp (>= 1.0), systemfonts, purrr, rlang, uuid,\nvctrs",
+ "LinkingTo": "Rcpp, systemfonts",
+ "Suggests": "knitr, tinytest, rmarkdown, maps, hexbin, shiny, sf (>= 1.0),\nggrepel (>= 0.9.1), quantreg, xml2 (>= 1.0), dplyr, gdtools (>=\n0.3.0)",
+ "VignetteBuilder": "knitr",
+ "URL": "https://davidgohel.github.io/ggiraph/",
+ "BugReports": "https://github.com/davidgohel/ggiraph/issues",
+ "RoxygenNote": "7.2.3",
+ "Collate": "'RcppExports.R' 'ipar.R' 'utils_ggplot2_performance.R'\n'utils_ggplot2.R' 'utils.R' 'annotate_interactive.R'\n'annotation_raster_interactive.R' 'utils_css.R' 'fonts.R'\n'girafe_options.R' 'default.R' 'dsvg.R' 'dsvg_view.R'\n'element_interactive.R' 'facet_interactive.R'\n'geom_abline_interactive.R' 'geom_path_interactive.R'\n'geom_polygon_interactive.R' 'geom_rect_interactive.R'\n'geom_bar_interactive.R' 'geom_bin_2d_interactive.R'\n'geom_boxplot_interactive.R' 'geom_col_interactive.R'\n'geom_contour_interactive.R' 'geom_count_interactive.R'\n'geom_crossbar_interactive.R' 'geom_curve_interactive.R'\n'geom_density_2d_interactive.R' 'geom_density_interactive.R'\n'geom_dotplot_interactive.R' 'geom_errorbar_interactive.R'\n'geom_errorbarh_interactive.R' 'geom_freqpoly_interactive.R'\n'geom_hex_interactive.R' 'geom_histogram_interactive.R'\n'geom_hline_interactive.R' 'geom_jitter_interactive.R'\n'geom_label_interactive.R' 'geom_linerange_interactive.R'\n'geom_map_interactive.R' 'geom_point_interactive.R'\n'geom_pointrange_interactive.R' 'geom_quantile_interactive.R'\n'geom_raster_interactive.R' 'geom_ribbon_interactive.R'\n'geom_segment_interactive.R' 'geom_sf_interactive.R'\n'geom_smooth_interactive.R' 'geom_spoke_interactive.R'\n'geom_text_interactive.R' 'geom_text_repel_interactive.R'\n'geom_tile_interactive.R' 'geom_violin_interactive.R'\n'geom_vline_interactive.R' 'ggiraph.R' 'girafe.R'\n'grob_interactive.R' 'guide_bins_interactive.R'\n'guide_colourbar_interactive.R'\n'guide_coloursteps_interactive.R' 'guide_interactive.R'\n'guide_legend_interactive.R' 'interactive_circle_grob.R'\n'interactive_curve_grob.R' 'interactive_path_grob.R'\n'interactive_points_grob.R' 'interactive_polygon_grob.R'\n'interactive_polyline_grob.R' 'interactive_raster_grob.R'\n'interactive_rect_grob.R' 'interactive_roundrect_grob.R'\n'interactive_segments_grob.R' 'interactive_text_grob.R'\n'labeller_interactive.R' 'layer_interactive.R'\n'scale_alpha_interactive.R' 'scale_brewer_interactive.R'\n'scale_colour_interactive.R' 'scale_gradient_interactive.R'\n'scale_interactive.R' 'scale_linetype_interactive.R'\n'scale_manual_interactive.R' 'scale_shape_interactive.R'\n'scale_size_interactive.R' 'scale_steps_interactive.R'\n'scale_viridis_interactive.R' 'tracers.R'",
+ "NeedsCompilation": "yes",
+ "Packaged": "2023-03-17 12:23:25 UTC; davidgohel",
+ "Author": "David Gohel [aut, cre],\n Panagiotis Skintzos [aut],\n Mike Bostock [cph] (d3.js),\n Speros Kokenes [cph] (d3-lasso),\n Eric Shull [cph] (saveSvgAsPng js library),\n Lee Thomason [cph] (TinyXML2),\n Vladimir Agafonkin [cph] (Flatbush),\n Eric Book [ctb] (hline and vline geoms)",
+ "Maintainer": "David Gohel ",
+ "Repository": "CRAN",
+ "Date/Publication": "2023-03-17 13:50:03 UTC",
+ "Built": "R 4.2.0; x86_64-apple-darwin17.0; 2023-03-18 14:17:34 UTC; unix",
+ "Archs": "ggiraph.so.dSYM"
+ }
+ },
+ "ggplot2": {
+ "Source": "CRAN",
+ "Repository": "https://cran.rstudio.com",
+ "description": {
+ "Package": "ggplot2",
+ "Version": "3.4.1",
+ "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(\"RStudio\", 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.3)",
+ "Imports": "cli, glue, grDevices, grid, gtable (>= 0.1.1), isoband,\nlifecycle (> 1.0.1), MASS, mgcv, rlang (>= 1.0.0), scales (>=\n1.2.0), stats, tibble, vctrs (>= 0.5.0), withr (>= 2.5.0)",
+ "Suggests": "covr, dplyr, ggplot2movies, hexbin, Hmisc, knitr, lattice,\nmapproj, maps, maptools, multcomp, munsell, nlme, profvis,\nquantreg, ragg, RColorBrewer, rgeos, rmarkdown, rpart, sf (>=\n0.7-3), svglite (>= 1.2.0.9001), testthat (>= 3.1.2), vdiffr\n(>= 1.0.0), xml2",
+ "Enhances": "sp",
+ "VignetteBuilder": "knitr",
+ "Config/Needs/website": "ggtext, tidyr, forcats, tidyverse/tidytemplate",
+ "Config/testthat/edition": "3",
+ "Encoding": "UTF-8",
+ "LazyData": "true",
+ "RoxygenNote": "7.2.1",
+ "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'legend-draw.r' 'geom-.r' 'annotation-custom.r'\n'annotation-logticks.r' 'geom-polygon.r' 'geom-map.r'\n'annotation-map.r' 'geom-raster.r' 'annotation-raster.r'\n'annotation.r' 'autolayer.r' 'autoplot.r' 'axis-secondary.R'\n'backports.R' 'bench.r' 'bin.R' 'coord-.r' 'coord-cartesian-.r'\n'coord-fixed.r' 'coord-flip.r' 'coord-map.r' 'coord-munch.r'\n'coord-polar.r' 'coord-quickmap.R' 'coord-sf.R'\n'coord-transform.r' 'data.R' 'facet-.r' 'facet-grid-.r'\n'facet-null.r' 'facet-wrap.r' 'fortify-lm.r' 'fortify-map.r'\n'fortify-multcomp.r' 'fortify-spatial.r' 'fortify.r' 'stat-.r'\n'geom-abline.r' 'geom-rect.r' 'geom-bar.r' 'geom-bin2d.r'\n'geom-blank.r' 'geom-boxplot.r' 'geom-col.r' 'geom-path.r'\n'geom-contour.r' 'geom-count.r' 'geom-crossbar.r'\n'geom-segment.r' 'geom-curve.r' 'geom-defaults.r'\n'geom-ribbon.r' 'geom-density.r' 'geom-density2d.r'\n'geom-dotplot.r' 'geom-errorbar.r' 'geom-errorbarh.r'\n'geom-freqpoly.r' 'geom-function.R' 'geom-hex.r'\n'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'guide-bins.R' 'guide-colorbar.r' 'guide-colorsteps.R'\n'guide-legend.r' 'guides-.r' 'guides-axis.r' 'guides-grid.r'\n'guides-none.r' 'hexbin.R' 'labeller.r' 'labels.r' 'layer.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' 'range.r' 'reshape-add-margins.R' 'save.r'\n'scale-.r' '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-quantile.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-elements.r' 'theme.r' 'theme-defaults.r'\n'theme-current.R' 'utilities-break.r' 'utilities-grid.r'\n'utilities-help.r' 'utilities-matrix.r'\n'utilities-resolution.r' 'utilities-table.r'\n'utilities-tidy-eval.R' 'zxx.r' 'zzz.r'",
+ "NeedsCompilation": "no",
+ "Packaged": "2023-02-06 09:42: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 RStudio [cph, fnd]",
+ "Maintainer": "Thomas Lin Pedersen ",
+ "Repository": "CRAN",
+ "Date/Publication": "2023-02-10 13:20:06 UTC",
+ "Built": "R 4.2.0; ; 2023-02-11 13:46:44 UTC; unix"
+ }
+ },
+ "gh": {
+ "Source": "CRAN",
+ "Repository": "https://cran.rstudio.com",
+ "description": {
+ "Package": "gh",
+ "Title": "'GitHub' 'API'",
+ "Version": "1.3.1",
+ "Authors@R": "c(\n person(\"Gábor\", \"Csárdi\", , \"csardi.gabor@gmail.com\", role = c(\"cre\", \"ctb\")),\n person(\"Jennifer\", \"Bryan\", role = \"aut\"),\n person(\"Hadley\", \"Wickham\", role = \"aut\"),\n person(\"RStudio\", role = c(\"cph\", \"fnd\"))\n )",
+ "Description": "Minimal client to access the 'GitHub' 'API'.",
+ "License": "MIT + file LICENSE",
+ "URL": "https://gh.r-lib.org/, https://github.com/r-lib/gh#readme",
+ "BugReports": "https://github.com/r-lib/gh/issues",
+ "Depends": "R (>= 3.4)",
+ "Imports": "cli (>= 3.0.1), gitcreds, httr (>= 1.2), ini, jsonlite",
+ "Suggests": "covr, knitr, mockery, rmarkdown, rprojroot, spelling,\ntestthat (>= 3.0.0), withr",
+ "VignetteBuilder": "knitr",
+ "Encoding": "UTF-8",
+ "Language": "en-US",
+ "RoxygenNote": "7.2.1.9000",
+ "Config/testthat/edition": "3",
+ "Config/Needs/website": "tidyverse/tidytemplate",
+ "NeedsCompilation": "no",
+ "Packaged": "2022-09-08 11:17:00 UTC; gaborcsardi",
+ "Author": "Gábor Csárdi [cre, ctb],\n Jennifer Bryan [aut],\n Hadley Wickham [aut],\n RStudio [cph, fnd]",
+ "Maintainer": "Gábor Csárdi ",
+ "Repository": "CRAN",
+ "Date/Publication": "2022-09-08 11:42:55 UTC",
+ "Built": "R 4.2.0; ; 2022-09-09 12:28:44 UTC; unix"
+ }
+ },
+ "gitcreds": {
+ "Source": "CRAN",
+ "Repository": "https://cran.rstudio.com",
+ "description": {
+ "Package": "gitcreds",
+ "Title": "Query 'git' Credentials from 'R'",
+ "Version": "0.1.2",
+ "Authors@R": "c(\n person(\"Gábor\", \"Csárdi\", , \"csardi.gabor@gmail.com\", role = c(\"aut\", \"cre\")),\n person(\"RStudio\", role = c(\"cph\", \"fnd\"))\n )",
+ "Description": "Query, set, delete credentials from the 'git' credential\n store. Manage 'GitHub' tokens and other 'git' credentials. This\n package is to be used by other packages that need to authenticate to\n 'GitHub' and/or other 'git' repositories.",
+ "License": "MIT + file LICENSE",
+ "URL": "https://gitcreds.r-lib.org/, https://github.com/r-lib/gitcreds",
+ "BugReports": "https://github.com/r-lib/gitcreds/issues",
+ "Depends": "R (>= 3.4)",
+ "Suggests": "codetools, covr, knitr, mockery, oskeyring, rmarkdown,\ntestthat (>= 3.0.0), withr",
+ "VignetteBuilder": "knitr",
+ "Config/Needs/website": "tidyverse/tidytemplate",
+ "Encoding": "UTF-8",
+ "RoxygenNote": "7.2.1.9000",
+ "SystemRequirements": "git",
+ "Config/testthat/edition": "3",
+ "NeedsCompilation": "no",
+ "Packaged": "2022-09-08 10:28:07 UTC; gaborcsardi",
+ "Author": "Gábor Csárdi [aut, cre],\n RStudio [cph, fnd]",
+ "Maintainer": "Gábor Csárdi ",
+ "Repository": "CRAN",
+ "Date/Publication": "2022-09-08 10:42:55 UTC",
+ "Built": "R 4.2.0; ; 2022-09-09 11:54:44 UTC; unix"
+ }
+ },
+ "glue": {
+ "Source": "CRAN",
+ "Repository": "https://cran.rstudio.com",
+ "description": {
+ "Package": "glue",
+ "Title": "Interpreted String Literals",
+ "Version": "1.7.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.3.0), 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.2.3.9000",
+ "NeedsCompilation": "yes",
+ "Packaged": "2024-01-08 16:10:57 UTC; jenny",
+ "Author": "Jim Hester [aut] (),\n Jennifer Bryan [aut, cre] (),\n Posit Software, PBC [cph, fnd]",
+ "Maintainer": "Jennifer Bryan ",
+ "Repository": "CRAN",
+ "Date/Publication": "2024-01-09 23:13:08 UTC",
+ "Built": "R 4.2.2; x86_64-apple-darwin17.0; 2024-02-27 16:57:50 UTC; unix"
+ }
+ },
+ "googledrive": {
+ "Source": "CRAN",
+ "Repository": "https://cran.rstudio.com",
+ "description": {
+ "Package": "googledrive",
+ "Title": "An Interface to Google Drive",
+ "Version": "2.0.0",
+ "Authors@R": "\n c(person(given = \"Lucy\",\n family = \"D'Agostino McGowan\",\n role = \"aut\",\n email = \"ld.mcgowan@vanderbilt.edu\"),\n person(given = \"Jennifer\",\n family = \"Bryan\",\n role = c(\"aut\", \"cre\"),\n email = \"jenny@rstudio.com\",\n comment = c(ORCID = \"0000-0002-6983-2759\")),\n person(given = \"RStudio\",\n role = c(\"cph\", \"fnd\")))",
+ "Description": "Manage Google Drive files from R.",
+ "License": "MIT + file LICENSE",
+ "URL": "https://googledrive.tidyverse.org,\nhttps://github.com/tidyverse/googledrive",
+ "BugReports": "https://github.com/tidyverse/googledrive/issues",
+ "Depends": "R (>= 3.3)",
+ "Imports": "cli (>= 3.0.0), gargle (>= 1.2.0), glue (>= 1.4.2), httr,\njsonlite, lifecycle, magrittr, pillar, purrr (>= 0.2.3), rlang\n(>= 0.4.9), tibble (>= 2.0.0), utils, uuid, vctrs (>= 0.3.0),\nwithr",
+ "Suggests": "covr, curl, downlit, dplyr (>= 1.0.0), knitr, mockr,\nrmarkdown, roxygen2, sodium, spelling, testthat (>= 3.0.0)",
+ "VignetteBuilder": "knitr",
+ "Config/Needs/website": "pkgdown, tidyverse, r-lib/downlit,\ntidyverse/tidytemplate",
+ "Config/testthat/edition": "3",
+ "Encoding": "UTF-8",
+ "Language": "en-US",
+ "RoxygenNote": "7.1.1.9001",
+ "NeedsCompilation": "no",
+ "Packaged": "2021-07-07 23:19:26 UTC; jenny",
+ "Author": "Lucy D'Agostino McGowan [aut],\n Jennifer Bryan [aut, cre] (),\n RStudio [cph, fnd]",
+ "Maintainer": "Jennifer Bryan ",
+ "Repository": "CRAN",
+ "Date/Publication": "2021-07-08 09:10:06 UTC",
+ "Built": "R 4.2.0; ; 2022-04-27 22:32:15 UTC; unix"
+ }
+ },
+ "googlesheets4": {
+ "Source": "CRAN",
+ "Repository": "https://cran.rstudio.com",
+ "description": {
+ "Package": "googlesheets4",
+ "Title": "Access Google Sheets using the Sheets API V4",
+ "Version": "1.0.1",
+ "Authors@R": "c(\n person(\"Jennifer\", \"Bryan\", , \"jenny@rstudio.com\", role = c(\"cre\", \"aut\"),\n comment = c(ORCID = \"0000-0002-6983-2759\")),\n person(\"RStudio\", role = c(\"cph\", \"fnd\"))\n )",
+ "Description": "Interact with Google Sheets through the Sheets API v4\n . \"API\" is an acronym for\n \"application programming interface\"; the Sheets API allows users to\n interact with Google Sheets programmatically, instead of via a web\n browser. The \"v4\" refers to the fact that the Sheets API is currently\n at version 4. This package can read and write both the metadata and\n the cell data in a Sheet.",
+ "License": "MIT + file LICENSE",
+ "URL": "https://googlesheets4.tidyverse.org,\nhttps://github.com/tidyverse/googlesheets4",
+ "BugReports": "https://github.com/tidyverse/googlesheets4/issues",
+ "Depends": "R (>= 3.4)",
+ "Imports": "cellranger, cli (>= 3.0.0), curl, gargle (>= 1.2.0), glue (>=\n1.3.0), googledrive (>= 2.0.0), httr, ids, magrittr, methods,\npurrr, rematch2, rlang (>= 1.0.2), tibble (>= 2.1.1), utils,\nvctrs (>= 0.2.3)",
+ "Suggests": "covr, readr, rmarkdown, sodium, spelling, testthat (>=\n3.1.3), withr",
+ "ByteCompile": "true",
+ "Config/Needs/website": "tidyverse, tidyverse/tidytemplate",
+ "Config/testthat/edition": "3",
+ "Encoding": "UTF-8",
+ "Language": "en-US",
+ "RoxygenNote": "7.2.1",
+ "NeedsCompilation": "no",
+ "Packaged": "2022-08-13 19:49:54 UTC; jenny",
+ "Author": "Jennifer Bryan [cre, aut] (),\n RStudio [cph, fnd]",
+ "Maintainer": "Jennifer Bryan ",
+ "Repository": "CRAN",
+ "Date/Publication": "2022-08-13 20:10:02 UTC",
+ "Built": "R 4.2.0; ; 2022-08-14 11:55:34 UTC; unix"
+ }
+ },
+ "gridExtra": {
+ "Source": "CRAN",
+ "Repository": "https://cran.rstudio.com",
+ "description": {
+ "Package": "gridExtra",
+ "Authors@R": "c(person(\"Baptiste\", \"Auguie\",\n email = \"baptiste.auguie@gmail.com\",\n role = c(\"aut\", \"cre\")), person(\"Anton\", \"Antonov\",\n email = \"tonytonov@gmail.com\",\n role = c(\"ctb\")))",
+ "License": "GPL (>= 2)",
+ "Title": "Miscellaneous Functions for \"Grid\" Graphics",
+ "Type": "Package",
+ "Description": "Provides a number of user-level functions to work with \"grid\"\n graphics, notably to arrange multiple grid-based plots on a page, and draw\n tables.",
+ "Version": "2.3",
+ "VignetteBuilder": "knitr",
+ "Imports": "gtable, grid, grDevices, graphics, utils",
+ "Suggests": "ggplot2, egg, lattice, knitr, testthat",
+ "RoxygenNote": "6.0.1",
+ "NeedsCompilation": "no",
+ "Packaged": "2017-09-08 22:52:09 UTC; baptiste",
+ "Author": "Baptiste Auguie [aut, cre],\n Anton Antonov [ctb]",
+ "Maintainer": "Baptiste Auguie ",
+ "Repository": "CRAN",
+ "Date/Publication": "2017-09-09 14:12:08 UTC",
+ "Built": "R 4.2.0; ; 2022-04-25 03:21:44 UTC; unix"
+ }
+ },
+ "gt": {
+ "Source": "CRAN",
+ "Repository": "https://cran.rstudio.com",
+ "description": {
+ "Type": "Package",
+ "Package": "gt",
+ "Version": "0.10.1",
+ "Title": "Easily Create Presentation-Ready Display Tables",
+ "Description": "Build display tables from tabular data with an easy-to-use set of\n functions. With its progressive approach, we can construct display tables\n with a cohesive set of table parts. Table values can be formatted using any\n of the included formatting functions. Footnotes and cell styles can be \n precisely added through a location targeting system. The way in which 'gt'\n handles things for you means that you don't often have to worry about the\n fine details.",
+ "Authors@R": "c(\n person(\"Richard\", \"Iannone\", , \"rich@posit.co\", c(\"aut\", \"cre\"),\n comment = c(ORCID = \"0000-0003-3925-190X\")),\n person(\"Joe\", \"Cheng\", , \"joe@posit.co\", \"aut\"),\n person(\"Barret\", \"Schloerke\", , \"barret@posit.co\", \"aut\",\n comment = c(ORCID = \"0000-0001-9986-114X\")),\n person(\"Ellis\", \"Hughes\", , \"ellis.h.hughes@gsk.com\", \"aut\",\n comment = c(ORCID = \"0000-0003-0637-4436\")), \n person(\"Alexandra\", \"Lauer\", , \"alexandralauer1@gmail.com\", \"aut\",\n comment = c(ORCID = \"0000-0002-4191-6301\")), \n person(\"JooYoung\", \"Seo\", , \"jseo1005@illinois.edu\", \"aut\",\n comment = c(ORCID = \"0000-0002-4064-6012\")),\n person(\"Posit Software, PBC\", role = c(\"cph\", \"fnd\"))\n )",
+ "License": "MIT + file LICENSE",
+ "URL": "https://gt.rstudio.com, https://github.com/rstudio/gt",
+ "BugReports": "https://github.com/rstudio/gt/issues",
+ "Encoding": "UTF-8",
+ "LazyData": "true",
+ "ByteCompile": "true",
+ "RoxygenNote": "7.2.3",
+ "Depends": "R (>= 3.2.0)",
+ "Imports": "base64enc (>= 0.1-3), bigD (>= 0.2), bitops (>= 1.0-7), cli\n(>= 3.6.0), commonmark (>= 1.8.1), dplyr (>= 1.1.0), fs (>=\n1.6.1), glue (>= 1.6.2), htmltools (>= 0.5.4), htmlwidgets (>=\n1.6.1), juicyjuice (>= 0.1.0), magrittr (>= 2.0.2), markdown\n(>= 1.5), reactable (>= 0.4.3), rlang (>= 1.0.2), sass (>=\n0.4.5), scales (>= 1.2.1), tidyselect (>= 1.2.0), vctrs, xml2\n(>= 1.3.3)",
+ "Suggests": "covr, digest (>= 0.6.31), fontawesome (>= 0.5.2), ggplot2,\nknitr, lubridate, magick, paletteer, RColorBrewer, rmarkdown\n(>= 2.20), rvest, shiny (>= 1.7.4), testthat (>= 3.1.9), tidyr,\nwebshot2 (>= 0.1.0)",
+ "Collate": "'as_data_frame.R' 'build_data.R' 'compile_scss.R'\n'data_color.R' 'datasets.R' 'dt__.R' 'dt_body.R' 'dt_boxhead.R'\n'dt_cols_merge.R' 'dt_data.R' 'dt_footnotes.R' 'dt_formats.R'\n'dt_groups_rows.R' 'dt_has_built.R' 'dt_heading.R'\n'dt_locale.R' 'dt_options.R' 'dt_row_groups.R'\n'dt_source_notes.R' 'dt_spanners.R' 'dt_stub_df.R'\n'dt_stubhead.R' 'dt_styles.R' 'dt_substitutions.R'\n'dt_summary.R' 'dt_transforms.R' 'export.R' 'format_data.R'\n'format_vec.R' 'gt-package.R' 'gt.R' 'gt_group.R'\n'gt_preview.R' 'gt_split.R' 'helpers.R' 'image.R'\n'info_tables.R' 'knitr-utils.R' 'location_methods.R'\n'modify_columns.R' 'modify_rows.R' 'tab_create_modify.R'\n'opts.R' 'print.R' 'reexports.R' 'render_as_html.R'\n'render_as_i_html.R' 'resolver.R' 'rows_add.R' 'shiny.R'\n'substitution.R' 'summary_rows.R' 'tab_info.R' 'tab_remove.R'\n'tab_style_body.R' 'text_transform.R' 'utils.R'\n'utils_color_contrast.R' 'utils_environments.R'\n'utils_examples.R' 'utils_formatters.R'\n'utils_general_str_formatting.R' 'utils_pipe.R' 'utils_plots.R'\n'utils_render_common.R' 'utils_render_html.R'\n'utils_render_latex.R' 'utils_render_rtf.R'\n'utils_render_xml.R' 'utils_units.R'\n'z_utils_render_footnotes.R' 'zzz.R'",
+ "Config/testthat/edition": "3",
+ "Config/testthat/parallel": "true",
+ "NeedsCompilation": "no",
+ "Packaged": "2024-01-17 22:09:40 UTC; rich",
+ "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 Posit Software, PBC [cph, fnd]",
+ "Maintainer": "Richard Iannone ",
+ "Repository": "CRAN",
+ "Date/Publication": "2024-01-17 23:50:05 UTC",
+ "Built": "R 4.2.2; ; 2024-07-05 15:33:54 UTC; unix"
+ }
+ },
+ "gtable": {
+ "Source": "CRAN",
+ "Repository": "https://cran.rstudio.com",
+ "description": {
+ "Package": "gtable",
+ "Title": "Arrange 'Grobs' in Tables",
+ "Version": "0.3.1",
+ "Authors@R": "\n c(person(given = \"Hadley\",\n family = \"Wickham\",\n role = c(\"aut\", \"cre\"),\n email = \"hadley@rstudio.com\"),\n person(given = \"Thomas Lin\",\n family = \"Pedersen\",\n role = \"aut\",\n email = \"thomas.pedersen@rstudio.com\"),\n person(given = \"RStudio\",\n role = \"cph\"))",
+ "Description": "Tools to make it easier to work with \"tables\" of\n 'grobs'. The 'gtable' package defines a 'gtable' grob class that specifies a\n grid along with a list of grobs and their placement in the grid. Further the\n package makes it easy to manipulate and combine 'gtable' objects so that \n complex compositions can be built up sequentially.",
+ "License": "MIT + file LICENSE",
+ "Depends": "R (>= 3.0)",
+ "Imports": "grid",
+ "Suggests": "covr, testthat, knitr, rmarkdown, ggplot2, profvis",
+ "Encoding": "UTF-8",
+ "RoxygenNote": "7.2.1",
+ "Collate": "'new-data-frame.r' 'add-grob.r' 'add-rows-cols.r'\n'add-space.r' 'grid.r' 'gtable-layouts.r' 'gtable-package.R'\n'gtable.r' 'rbind-cbind.r' 'utils.r' 'trim.r' 'filter.r'\n'align.r' 'padding.r' 'z.r'",
+ "URL": "https://gtable.r-lib.org, https://github.com/r-lib/gtable",
+ "BugReports": "https://github.com/r-lib/gtable/issues",
+ "VignetteBuilder": "knitr",
+ "NeedsCompilation": "no",
+ "Packaged": "2022-08-31 22:42:55 UTC; hadleywickham",
+ "Author": "Hadley Wickham [aut, cre],\n Thomas Lin Pedersen [aut],\n RStudio [cph]",
+ "Maintainer": "Hadley Wickham ",
+ "Repository": "CRAN",
+ "Date/Publication": "2022-09-01 02:40:12 UTC",
+ "Built": "R 4.2.0; ; 2022-09-01 11:42:54 UTC; unix"
+ }
+ },
+ "haven": {
+ "Source": "CRAN",
+ "Repository": "https://cran.rstudio.com",
+ "description": {
+ "Package": "haven",
+ "Title": "Import and Export 'SPSS', 'Stata' and 'SAS' Files",
+ "Version": "2.5.1",
+ "Authors@R": "c(\n person(\"Hadley\", \"Wickham\", , \"hadley@rstudio.com\", 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(\"RStudio\", 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.4)",
+ "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)",
+ "LinkingTo": "cpp11",
+ "VignetteBuilder": "knitr",
+ "Config/Needs/website": "tidyverse/tidytemplate",
+ "Config/testthat/edition": "3",
+ "Encoding": "UTF-8",
+ "RoxygenNote": "7.2.1",
+ "SystemRequirements": "GNU make, C++11, zlib: zlib1g-dev (deb), zlib-devel\n(rpm)",
+ "NeedsCompilation": "yes",
+ "Packaged": "2022-08-22 18:39:56 UTC; hadleywickham",
+ "Author": "Hadley Wickham [aut, cre],\n Evan Miller [aut, cph] (Author of included ReadStat code),\n Danny Smith [aut],\n RStudio [cph, fnd]",
+ "Maintainer": "Hadley Wickham ",
+ "Repository": "CRAN",
+ "Date/Publication": "2022-08-22 19:10:04 UTC",
+ "Built": "R 4.2.0; x86_64-apple-darwin17.0; 2022-08-23 12:31:39 UTC; unix",
+ "Archs": "haven.so.dSYM"
+ }
+ },
+ "highr": {
+ "Source": "CRAN",
+ "Repository": "https://cran.rstudio.com",
+ "description": {
+ "Package": "highr",
+ "Type": "Package",
+ "Title": "Syntax Highlighting for R Source Code",
+ "Version": "0.10",
+ "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.2.3",
+ "NeedsCompilation": "no",
+ "Packaged": "2022-12-22 06:43:07 UTC; yihui",
+ "Author": "Yihui Xie [aut, cre] (),\n Yixuan Qiu [aut],\n Christopher Gandrud [ctb],\n Qiang Li [ctb]",
+ "Maintainer": "Yihui Xie ",
+ "Repository": "CRAN",
+ "Date/Publication": "2022-12-22 07:00:02 UTC",
+ "Built": "R 4.2.0; ; 2022-12-23 12:44:31 UTC; unix"
+ }
+ },
+ "hms": {
+ "Source": "CRAN",
+ "Repository": "https://cran.rstudio.com",
+ "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": "CRAN",
+ "Date/Publication": "2023-03-21 18:10:02 UTC",
+ "Built": "R 4.2.0; ; 2023-03-22 13:09:43 UTC; unix"
+ }
+ },
+ "htmltools": {
+ "Source": "CRAN",
+ "Repository": "https://cran.rstudio.com",
+ "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": "CRAN",
+ "Date/Publication": "2024-04-04 05:03:00 UTC",
+ "Built": "R 4.2.2; x86_64-apple-darwin17.0; 2024-06-20 17:40:23 UTC; unix"
+ }
+ },
+ "htmlwidgets": {
+ "Source": "CRAN",
+ "Repository": "https://cran.rstudio.com",
+ "description": {
+ "Package": "htmlwidgets",
+ "Type": "Package",
+ "Title": "HTML Widgets for R",
+ "Version": "1.6.1",
+ "Authors@R": "c(\n person(\"Ramnath\", \"Vaidyanathan\", role = c(\"aut\", \"cph\")),\n person(\"Yihui\", \"Xie\", role = c(\"aut\")),\n person(\"JJ\", \"Allaire\", role = c(\"aut\")),\n person(\"Joe\", \"Cheng\", role = c(\"aut\"), email = \"joe@rstudio.com\"),\n person(\"Carson\", \"Sievert\", role = c(\"aut\", \"cre\"), email = \"carson@rstudio.com\", comment = c(ORCID = \"0000-0002-4958-2844\")),\n person(\"Kenton\", \"Russell\", role = c(\"aut\", \"cph\")),\n person(\"Ellis\", \"Hughes\", role = c(\"ctb\")),\n person(family = \"RStudio\", role = \"cph\")\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",
+ "VignetteBuilder": "knitr",
+ "Imports": "grDevices, htmltools (>= 0.5.4), jsonlite (>= 0.9.16), yaml,\nknitr (>= 1.8), rmarkdown",
+ "Suggests": "testthat",
+ "Enhances": "shiny (>= 1.1)",
+ "URL": "https://github.com/ramnathv/htmlwidgets",
+ "BugReports": "https://github.com/ramnathv/htmlwidgets/issues",
+ "RoxygenNote": "7.2.1",
+ "Encoding": "UTF-8",
+ "NeedsCompilation": "no",
+ "Packaged": "2023-01-06 23:30:10 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 RStudio [cph]",
+ "Maintainer": "Carson Sievert ",
+ "Repository": "CRAN",
+ "Date/Publication": "2023-01-07 03:50:02 UTC",
+ "Built": "R 4.2.0; ; 2023-01-07 15:14:50 UTC; unix"
+ }
+ },
+ "httpuv": {
+ "Source": "CRAN",
+ "Repository": "https://cran.rstudio.com",
+ "description": {
+ "Type": "Package",
+ "Package": "httpuv",
+ "Title": "HTTP and WebSocket Server Library",
+ "Version": "1.6.13",
+ "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.2.3",
+ "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": "2023-12-05 23:46:15 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": "CRAN",
+ "Date/Publication": "2023-12-06 09:20:02 UTC",
+ "Built": "R 4.2.0; x86_64-apple-darwin17.0; 2023-12-21 14:39:17 UTC; unix",
+ "Archs": "httpuv.so.dSYM"
+ }
+ },
+ "httr": {
+ "Source": "CRAN",
+ "Repository": "https://cran.rstudio.com",
+ "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": "CRAN",
+ "Date/Publication": "2023-08-15 09:00:02 UTC",
+ "Built": "R 4.2.0; ; 2023-08-16 11:21:46 UTC; unix"
+ }
+ },
+ "httr2": {
+ "Source": "CRAN",
+ "Repository": "https://cran.rstudio.com",
+ "description": {
+ "Package": "httr2",
+ "Title": "Perform HTTP Requests and Process the Responses",
+ "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 person(\"Maximilian\", \"Girlich\", role = \"ctb\")\n )",
+ "Description": "Tools for creating and modifying HTTP requests, then\n performing them and processing the results. 'httr2' is a modern\n re-imagining of 'httr' that uses a pipe-based interface and solves\n more of the problems that API wrapping packages face.",
+ "License": "MIT + file LICENSE",
+ "URL": "https://httr2.r-lib.org, https://github.com/r-lib/httr2",
+ "BugReports": "https://github.com/r-lib/httr2/issues",
+ "Depends": "R (>= 3.6)",
+ "Imports": "cli (>= 3.0.0), curl (>= 5.1.0), glue, lifecycle, magrittr,\nopenssl, R6, rappdirs, rlang (>= 1.1.0), vctrs (>= 0.6.3),\nwithr",
+ "Suggests": "askpass, bench, clipr, covr, docopt, httpuv, jose, jsonlite,\nknitr, rmarkdown, testthat (>= 3.1.8), tibble, webfakes, xml2",
+ "VignetteBuilder": "knitr",
+ "Config/Needs/website": "tidyverse/tidytemplate",
+ "Config/testthat/edition": "3",
+ "Encoding": "UTF-8",
+ "RoxygenNote": "7.2.3",
+ "NeedsCompilation": "no",
+ "Packaged": "2023-11-13 16:55:37 UTC; hadleywickham",
+ "Author": "Hadley Wickham [aut, cre],\n RStudio [cph, fnd],\n Maximilian Girlich [ctb]",
+ "Maintainer": "Hadley Wickham ",
+ "Repository": "CRAN",
+ "Date/Publication": "2023-11-14 13:53:23 UTC",
+ "Built": "R 4.2.0; ; 2023-12-21 10:19:40 UTC; unix",
+ "RemoteType": "standard",
+ "RemotePkgRef": "httr2",
+ "RemoteRef": "httr2",
+ "RemoteRepos": "https://cran.rstudio.com/",
+ "RemotePkgPlatform": "x86_64-apple-darwin17.0",
+ "RemoteSha": "1.0.0"
+ }
+ },
+ "ids": {
+ "Source": "CRAN",
+ "Repository": "https://cran.rstudio.com",
+ "description": {
+ "Package": "ids",
+ "Title": "Generate Random Identifiers",
+ "Version": "1.0.1",
+ "Authors@R": "person(\"Rich\", \"FitzJohn\", role = c(\"aut\", \"cre\"),\n email = \"rich.fitzjohn@gmail.com\")",
+ "Description": "Generate random or human readable and pronounceable identifiers.",
+ "License": "MIT + file LICENSE",
+ "URL": "https://github.com/richfitz/ids",
+ "BugReports": "https://github.com/richfitz/ids/issues",
+ "Imports": "openssl, uuid",
+ "Suggests": "knitr, rcorpora, rmarkdown, testthat",
+ "RoxygenNote": "6.0.1",
+ "VignetteBuilder": "knitr",
+ "NeedsCompilation": "no",
+ "Packaged": "2017-05-31 08:43:42 UTC; rich",
+ "Author": "Rich FitzJohn [aut, cre]",
+ "Maintainer": "Rich FitzJohn ",
+ "Repository": "CRAN",
+ "Date/Publication": "2017-05-31 08:49:59 UTC",
+ "Built": "R 4.2.0; ; 2022-04-26 23:53:27 UTC; unix"
+ }
+ },
+ "ini": {
+ "Source": "CRAN",
+ "Repository": "https://cran.rstudio.com",
+ "description": {
+ "Package": "ini",
+ "Type": "Package",
+ "Title": "Read and Write '.ini' Files",
+ "Version": "0.3.1",
+ "Date": "2018-05-19",
+ "Author": "David Valentim Dias",
+ "Maintainer": "David Valentim Dias ",
+ "Description": "Parse simple '.ini' configuration files to an structured list. Users\n can manipulate this resulting list with lapply() functions. This same\n structured list can be used to write back to file after modifications.",
+ "License": "GPL-3",
+ "URL": "https://github.com/dvdscripter/ini",
+ "BugReports": "https://github.com/dvdscripter/ini/issues",
+ "LazyData": "FALSE",
+ "RoxygenNote": "6.0.1",
+ "Suggests": "testthat",
+ "NeedsCompilation": "no",
+ "Packaged": "2018-05-19 23:19:45 UTC; CLIENTE",
+ "Repository": "CRAN",
+ "Date/Publication": "2018-05-20 03:26:39 UTC",
+ "Built": "R 4.2.0; ; 2022-04-25 03:41:46 UTC; unix"
+ }
+ },
+ "isoband": {
+ "Source": "CRAN",
+ "Repository": "https://cran.rstudio.com",
+ "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": "CRAN",
+ "Date/Publication": "2022-12-20 10:00:13 UTC",
+ "Built": "R 4.2.0; x86_64-apple-darwin17.0; 2022-12-21 12:45:46 UTC; unix",
+ "Archs": "isoband.so.dSYM"
+ }
+ },
+ "jquerylib": {
+ "Source": "CRAN",
+ "Repository": "https://cran.rstudio.com",
+ "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": "CRAN",
+ "Date/Publication": "2021-04-26 17:10:02 UTC",
+ "Built": "R 4.2.0; ; 2022-04-26 22:34:33 UTC; unix"
+ }
+ },
+ "jsonlite": {
+ "Source": "CRAN",
+ "Repository": "https://cran.rstudio.com",
+ "description": {
+ "Package": "jsonlite",
+ "Version": "1.8.8",
+ "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 = \"jeroen@berkeley.edu\",\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.2.3",
+ "Encoding": "UTF-8",
+ "NeedsCompilation": "yes",
+ "Packaged": "2023-12-04 12:57:12 UTC; jeroen",
+ "Author": "Jeroen Ooms [aut, cre] (),\n Duncan Temple Lang [ctb],\n Lloyd Hilaiel [cph] (author of bundled libyajl)",
+ "Repository": "CRAN",
+ "Date/Publication": "2023-12-04 15:20:02 UTC",
+ "Built": "R 4.2.0; x86_64-apple-darwin17.0; 2023-12-21 11:23:06 UTC; unix",
+ "Archs": "jsonlite.so.dSYM"
+ }
+ },
+ "juicyjuice": {
+ "Source": "CRAN",
+ "Repository": "https://cran.rstudio.com",
+ "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": "CRAN",
+ "Date/Publication": "2022-11-10 19:00:02 UTC",
+ "Built": "R 4.2.0; ; 2022-11-11 12:47:49 UTC; unix"
+ }
+ },
+ "knitr": {
+ "Source": "CRAN",
+ "Repository": "https://cran.rstudio.com",
+ "description": {
+ "Package": "knitr",
+ "Type": "Package",
+ "Title": "A General-Purpose Package for Dynamic Report Generation in R",
+ "Version": "1.42",
+ "Authors@R": "c(\n person(\"Yihui\", \"Xie\", role = c(\"aut\", \"cre\"), email = \"xie@yihui.name\", comment = c(ORCID = \"0000-0003-0645-5666\")),\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 )",
+ "Description": "Provides a general-purpose tool for dynamic report generation in R\n using Literate Programming techniques.",
+ "Depends": "R (>= 3.3.0)",
+ "Imports": "evaluate (>= 0.15), highr, methods, yaml (>= 2.1.19), xfun (>=\n0.34), tools",
+ "Suggests": "markdown (>= 1.3), formatR, testit, digest, rgl (>=\n0.95.1201), codetools, rmarkdown, htmlwidgets (>= 0.7),\nwebshot, tikzDevice (>= 0.10), tinytex, reticulate (>= 1.4),\nJuliaCall (>= 0.11.1), magick, png, jpeg, gifski, xml2 (>=\n1.2.0), httr, DBI (>= 0.4-1), showtext, tibble, sass, bslib,\nragg, gridSVG, styler (>= 1.2.0), targets (>= 0.6.0)",
+ "License": "GPL",
+ "URL": "https://yihui.org/knitr/",
+ "BugReports": "https://github.com/yihui/knitr/issues",
+ "Encoding": "UTF-8",
+ "VignetteBuilder": "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' 'utils.R' 'citation.R' 'hooks-html.R'\n'plot.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.2.3",
+ "NeedsCompilation": "no",
+ "Packaged": "2023-01-20 05:51:44 UTC; yihui",
+ "Author": "Yihui Xie [aut, cre] (),\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] ()",
+ "Maintainer": "Yihui Xie ",
+ "Repository": "CRAN",
+ "Date/Publication": "2023-01-25 10:20:08 UTC",
+ "Built": "R 4.2.0; ; 2023-01-26 13:33:19 UTC; unix"
+ }
+ },
+ "labeling": {
+ "Source": "CRAN",
+ "Repository": "https://cran.rstudio.com",
+ "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": "CRAN",
+ "Date/Publication": "2023-08-29 22:20:02 UTC",
+ "Built": "R 4.2.0; ; 2023-08-30 10:22:49 UTC; unix"
+ }
+ },
+ "later": {
+ "Source": "CRAN",
+ "Repository": "https://cran.rstudio.com",
+ "description": {
+ "Package": "later",
+ "Type": "Package",
+ "Title": "Utilities for Scheduling Functions to Execute Later with Event\nLoops",
+ "Version": "1.3.0",
+ "Authors@R": "c(\n person(\"Winston\", \"Chang\", role = c(\"aut\", \"cre\"), email = \"winston@rstudio.com\"),\n person(\"Joe\", \"Cheng\", role = c(\"aut\"), email = \"joe@rstudio.com\"),\n person(family = \"RStudio\", 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://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.1.1",
+ "SystemRequirements": "C++11",
+ "Suggests": "knitr, rmarkdown, testthat (>= 2.1.0)",
+ "VignetteBuilder": "knitr",
+ "Encoding": "UTF-8",
+ "NeedsCompilation": "yes",
+ "Packaged": "2021-08-18 14:03:28 UTC; barret",
+ "Author": "Winston Chang [aut, cre],\n Joe Cheng [aut],\n RStudio [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": "CRAN",
+ "Date/Publication": "2021-08-18 16:30:06 UTC",
+ "Built": "R 4.2.0; x86_64-apple-darwin17.0; 2022-04-26 08:49:56 UTC; unix",
+ "Archs": "later.so.dSYM"
+ }
+ },
+ "lattice": {
+ "Source": "CRAN",
+ "Repository": "https://cran.rstudio.com",
+ "description": {
+ "Package": "lattice",
+ "Version": "0.20-45",
+ "Date": "2021-09-18",
+ "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 = \"colorkey title\"),\n person(\"Paul\", \"Murrell\", role = \"ctb\", email = \"paul@stat.auckland.ac.nz\"))",
+ "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 (>= 3.0.0)",
+ "Suggests": "KernSmooth, MASS, latticeExtra",
+ "Imports": "grid, grDevices, graphics, stats, utils",
+ "Enhances": "chron",
+ "LazyLoad": "yes",
+ "LazyData": "yes",
+ "License": "GPL (>= 2)",
+ "URL": "http://lattice.r-forge.r-project.org/",
+ "BugReports": "https://github.com/deepayan/lattice/issues",
+ "NeedsCompilation": "yes",
+ "Packaged": "2021-09-22 09:17:07 UTC; deepayan",
+ "Author": "Deepayan Sarkar [aut, cre] (),\n Felix Andrews [ctb],\n Kevin Wright [ctb] (documentation),\n Neil Klepeis [ctb],\n Johan Larsson [ctb] (colorkey title),\n Paul Murrell [ctb]",
+ "Maintainer": "Deepayan Sarkar ",
+ "Repository": "CRAN",
+ "Date/Publication": "2021-09-22 12:10:02 UTC",
+ "Built": "R 4.2.2; x86_64-apple-darwin17.0; 2022-10-31 22:33:21 UTC; unix"
+ }
+ },
+ "lazyeval": {
+ "Source": "CRAN",
+ "Repository": "https://cran.rstudio.com",
+ "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": "CRAN",
+ "Date/Publication": "2019-03-15 17:50:07 UTC",
+ "Built": "R 4.2.0; x86_64-apple-darwin17.0; 2022-04-25 03:04:26 UTC; unix",
+ "Archs": "lazyeval.so.dSYM"
+ }
+ },
+ "leaflet": {
+ "Source": "CRAN",
+ "Repository": "https://cran.rstudio.com",
+ "description": {
+ "Package": "leaflet",
+ "Type": "Package",
+ "Title": "Create Interactive Web Maps with the JavaScript 'Leaflet'\nLibrary",
+ "Version": "2.1.1",
+ "Authors@R": "c(\n person(\"Joe\", \"Cheng\", email = \"joe@rstudio.com\", role = c(\"aut\", \"cre\")),\n person(\"Bhaskar\", \"Karambelkar\", role = c(\"aut\")),\n person(\"Yihui\", \"Xie\", role = c(\"aut\")),\n person(\"Hadley\", \"Wickham\", role = c(\"ctb\")),\n person(\"Kenton\", \"Russell\", role = c(\"ctb\")),\n person(\"Kent\", \"Johnson\", role = c(\"ctb\")),\n person(\"Barret\", \"Schloerke\", role = c(\"ctb\")),\n person(\"jQuery Foundation and contributors\", role = c(\"ctb\", \"cph\"), comment = \"jQuery library\"),\n person(\"Vladimir\", \"Agafonkin\", role = c(\"ctb\", \"cph\"), comment = \"Leaflet library\"),\n person(\"CloudMade\", role = c(\"cph\"), comment = \"Leaflet library\"),\n person(\"Leaflet contributors\", role = c(\"ctb\"), comment = \"Leaflet library\"),\n person(\"Brandon Copeland\", role = c(\"ctb\", \"cph\"), comment = \"leaflet-measure plugin\"),\n person(\"Joerg Dietrich\", role = c(\"ctb\", \"cph\"), comment = \"Leaflet.Terminator plugin\"),\n person(\"Benjamin Becquet\", role = c(\"ctb\", \"cph\"), comment = \"Leaflet.MagnifyingGlass plugin\"),\n person(\"Norkart AS\", role = c(\"ctb\", \"cph\"), comment = \"Leaflet.MiniMap plugin\"),\n person(\"L. Voogdt\", role = c(\"ctb\", \"cph\"), comment = \"Leaflet.awesome-markers plugin\"),\n person(\"Daniel Montague\", role = c(\"ctb\", \"cph\"), comment = \"Leaflet.EasyButton plugin\"),\n person(\"Kartena AB\", role = c(\"ctb\", \"cph\"), comment = \"Proj4Leaflet plugin\"),\n person(\"Robert Kajic\", role = c(\"ctb\", \"cph\"), comment = \"leaflet-locationfilter plugin\"),\n person(\"Mapbox\", role = c(\"ctb\", \"cph\"), comment = \"leaflet-omnivore plugin\"),\n person(\"Michael Bostock\", role = c(\"ctb\", \"cph\"), comment = \"topojson\"),\n person(\"RStudio\", role = c(\"cph\"))\n )",
+ "Description": "Create and customize interactive maps using the 'Leaflet'\n JavaScript library and the 'htmlwidgets' package. These maps can be used\n directly from the R console, from 'RStudio', in Shiny applications and R Markdown\n documents.",
+ "License": "GPL-3",
+ "URL": "https://rstudio.github.io/leaflet/",
+ "BugReports": "https://github.com/rstudio/leaflet/issues",
+ "Depends": "R (>= 3.1.0)",
+ "Imports": "base64enc, crosstalk, htmlwidgets (>= 1.5.4), htmltools,\nmagrittr, markdown, methods, png, RColorBrewer, raster, scales\n(>= 1.0.0), sp, stats, viridis (>= 0.5.1), leaflet.providers\n(>= 1.8.0)",
+ "Suggests": "knitr, maps, sf (>= 0.9-6), shiny, rgdal, rgeos, R6, RJSONIO,\npurrr, testthat (>= 3.0.0), s2",
+ "RoxygenNote": "7.1.2",
+ "Encoding": "UTF-8",
+ "LazyData": "true",
+ "NeedsCompilation": "no",
+ "Packaged": "2022-03-23 03:08:42 UTC; jcheng",
+ "Author": "Joe Cheng [aut, cre],\n Bhaskar Karambelkar [aut],\n Yihui Xie [aut],\n Hadley Wickham [ctb],\n Kenton Russell [ctb],\n Kent Johnson [ctb],\n Barret Schloerke [ctb],\n jQuery Foundation and contributors [ctb, cph] (jQuery library),\n Vladimir Agafonkin [ctb, cph] (Leaflet library),\n CloudMade [cph] (Leaflet library),\n Leaflet contributors [ctb] (Leaflet library),\n Brandon Copeland [ctb, cph] (leaflet-measure plugin),\n Joerg Dietrich [ctb, cph] (Leaflet.Terminator plugin),\n Benjamin Becquet [ctb, cph] (Leaflet.MagnifyingGlass plugin),\n Norkart AS [ctb, cph] (Leaflet.MiniMap plugin),\n L. Voogdt [ctb, cph] (Leaflet.awesome-markers plugin),\n Daniel Montague [ctb, cph] (Leaflet.EasyButton plugin),\n Kartena AB [ctb, cph] (Proj4Leaflet plugin),\n Robert Kajic [ctb, cph] (leaflet-locationfilter plugin),\n Mapbox [ctb, cph] (leaflet-omnivore plugin),\n Michael Bostock [ctb, cph] (topojson),\n RStudio [cph]",
+ "Maintainer": "Joe Cheng ",
+ "Repository": "CRAN",
+ "Date/Publication": "2022-03-23 23:40:02 UTC",
+ "Built": "R 4.2.0; ; 2022-04-12 23:44:06 UTC; unix"
+ }
+ },
+ "leaflet.providers": {
+ "Source": "CRAN",
+ "Repository": "https://cran.rstudio.com",
+ "description": {
+ "Package": "leaflet.providers",
+ "Type": "Package",
+ "Title": "Leaflet Providers",
+ "Version": "1.9.0",
+ "Authors@R": "c(\n person(\"Leslie\", \"Huang\", email = \"lesliehuang@nyu.edu\", role = c(\"aut\")),\n person(\"Barret\", \"Schloerke\", email = \"barret@rstudio.com\", role = c(\"ctb\", \"cre\"),\n comment = c(ORCID = \"0000-0001-9986-114X\")),\n person(\"Leaflet Providers contributors\", role = c(\"ctb\", \"cph\"), comment = \"Leaflet Providers plugin\"),\n person(\"RStudio\", role = c(\"cph\", \"fnd\"))\n )",
+ "Description": "Contains third-party map tile provider information from\n 'Leaflet.js', , to be\n used with the 'leaflet' R package. Additionally, 'leaflet.providers'\n enables users to retrieve up-to-date provider information between package\n updates.",
+ "License": "BSD_2_clause + file LICENSE",
+ "Encoding": "UTF-8",
+ "LazyData": "true",
+ "Depends": "R (>= 2.10)",
+ "Suggests": "V8, jsonlite, testthat (>= 2.1.0)",
+ "Language": "en-US",
+ "RoxygenNote": "6.1.1",
+ "URL": "https://github.com/rstudio/leaflet.providers",
+ "BugReports": "https://github.com/rstudio/leaflet.providers/issues",
+ "Collate": "'providers_data.R' 'get_current_providers.R'",
+ "NeedsCompilation": "no",
+ "Packaged": "2019-11-08 22:12:22 UTC; barret",
+ "Author": "Leslie Huang [aut],\n Barret Schloerke [ctb, cre] (),\n Leaflet Providers contributors [ctb, cph] (Leaflet Providers plugin),\n RStudio [cph, fnd]",
+ "Maintainer": "Barret Schloerke ",
+ "Repository": "CRAN",
+ "Date/Publication": "2019-11-09 23:40:09 UTC",
+ "Built": "R 4.2.0; ; 2022-04-25 03:33:10 UTC; unix"
+ }
+ },
+ "lifecycle": {
+ "Source": "CRAN",
+ "Repository": "https://cran.rstudio.com",
+ "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": "CRAN",
+ "Date/Publication": "2023-11-07 10:10:10 UTC",
+ "Built": "R 4.2.0; ; 2023-12-21 07:32:33 UTC; unix"
+ }
+ },
+ "lubridate": {
+ "Source": "CRAN",
+ "Repository": "https://cran.rstudio.com",
+ "description": {
+ "Type": "Package",
+ "Package": "lubridate",
+ "Title": "Make Dealing with Dates a Little Easier",
+ "Version": "1.9.0",
+ "Authors@R": "c(\n person(\"Vitalie\", \"Spinu\", , \"spinuvit@gmail.com\", role = c(\"aut\", \"cre\")),\n person(\"Garrett\", \"Grolemund\", role = \"aut\"),\n person(\"Hadley\", \"Wickham\", role = \"aut\"),\n person(\"Davis\", \"Vaughan\", role = \"ctb\"),\n person(\"Ian\", \"Lyttle\", role = \"ctb\"),\n person(\"Imanuel\", \"Costigan\", role = \"ctb\"),\n person(\"Jason\", \"Law\", role = \"ctb\"),\n person(\"Doug\", \"Mitarotonda\", role = \"ctb\"),\n person(\"Joseph\", \"Larmarange\", role = \"ctb\"),\n person(\"Jonathan\", \"Boiser\", role = \"ctb\"),\n person(\"Chel Hee\", \"Lee\", role = \"ctb\")\n )",
+ "Maintainer": "Vitalie Spinu ",
+ "Description": "Functions to work with date-times and time-spans: fast and\n user friendly parsing of date-time data, extraction and updating of\n components of a date-time (years, months, days, hours, minutes, and\n seconds), algebraic manipulation on date-time and time-span objects.\n The 'lubridate' package has a consistent and memorable syntax that\n makes working with dates easy and fun.",
+ "License": "GPL (>= 2)",
+ "URL": "https://lubridate.tidyverse.org,\nhttps://github.com/tidyverse/lubridate",
+ "BugReports": "https://github.com/tidyverse/lubridate/issues",
+ "Depends": "methods, timechange (>= 0.1.1), R (>= 3.2)",
+ "Imports": "generics",
+ "Suggests": "covr, knitr, rmarkdown, testthat (>= 2.1.0), vctrs (>= 0.5.0)",
+ "Enhances": "chron, data.table, timeDate, tis, zoo",
+ "VignetteBuilder": "knitr",
+ "Config/Needs/website": "tidyverse/tidytemplate",
+ "Config/testthat/edition": "3",
+ "Encoding": "UTF-8",
+ "LazyData": "true",
+ "RoxygenNote": "7.2.1",
+ "SystemRequirements": "C++11, A system with zoneinfo data (e.g.\n/usr/share/zoneinfo). On Windows the zoneinfo included with R\nis used.",
+ "Collate": "'Dates.r' 'POSIXt.r' 'util.r' 'parse.r' 'timespans.r'\n'intervals.r' 'difftimes.r' 'durations.r' 'periods.r'\n'accessors-date.R' 'accessors-day.r' 'accessors-dst.r'\n'accessors-hour.r' 'accessors-minute.r' 'accessors-month.r'\n'accessors-quarter.r' 'accessors-second.r' 'accessors-tz.r'\n'accessors-week.r' 'accessors-year.r' 'am-pm.r' 'time-zones.r'\n'numeric.r' 'coercion.r' 'constants.r' 'cyclic_encoding.r'\n'data.r' 'decimal-dates.r' 'deprecated.r' 'format_ISO8601.r'\n'guess.r' 'hidden.r' 'instants.r' 'leap-years.r'\n'ops-addition.r' 'ops-compare.r' 'ops-division.r'\n'ops-integer-division.r' 'ops-m+.r' 'ops-modulo.r'\n'ops-multiplication.r' 'ops-subtraction.r' 'package.r'\n'pretty.r' 'round.r' 'stamp.r' 'tzdir.R' 'update.r' 'vctrs.R'\n'zzz.R'",
+ "NeedsCompilation": "yes",
+ "Packaged": "2022-11-05 22:53:20 UTC; vspinu",
+ "Author": "Vitalie Spinu [aut, cre],\n Garrett Grolemund [aut],\n Hadley Wickham [aut],\n Davis Vaughan [ctb],\n Ian Lyttle [ctb],\n Imanuel Costigan [ctb],\n Jason Law [ctb],\n Doug Mitarotonda [ctb],\n Joseph Larmarange [ctb],\n Jonathan Boiser [ctb],\n Chel Hee Lee [ctb]",
+ "Repository": "CRAN",
+ "Date/Publication": "2022-11-06 07:50:02 UTC",
+ "Built": "R 4.2.0; x86_64-apple-darwin17.0; 2022-11-07 12:34:54 UTC; unix",
+ "Archs": "lubridate.so.dSYM"
+ }
+ },
+ "magrittr": {
+ "Source": "CRAN",
+ "Repository": "https://cran.rstudio.com",
+ "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": "CRAN",
+ "Date/Publication": "2022-03-30 07:30:09 UTC",
+ "Built": "R 4.2.0; x86_64-apple-darwin17.0; 2022-04-25 03:04:24 UTC; unix",
+ "Archs": "magrittr.so.dSYM"
+ }
+ },
+ "markdown": {
+ "Source": "CRAN",
+ "Repository": "https://cran.rstudio.com",
+ "description": {
+ "Package": "markdown",
+ "Type": "Package",
+ "Title": "Render Markdown with 'commonmark'",
+ "Version": "1.5",
+ "Authors@R": "c(\n person(\"JJ\", \"Allaire\", role = \"aut\"),\n person(\"Jeffrey\", \"Horner\", role = \"aut\"),\n person(\"Yihui\", \"Xie\", role = c(\"aut\", \"cre\"), email = \"xie@yihui.name\", comment = c(ORCID = \"0000-0003-0645-5666\")),\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(family = \"RStudio\", role = \"cph\")\n )",
+ "Description": "Render Markdown to full HTML documents with the 'commonmark'\n package. Markdown is a plain-text formatting\n syntax that can be converted to 'XHTML' or other formats. See\n for more information about Markdown.",
+ "Depends": "R (>= 2.11.1)",
+ "Imports": "utils, commonmark, xfun (>= 0.35)",
+ "Suggests": "knitr, rmarkdown (>= 2.18), yaml, RCurl",
+ "License": "GPL-2",
+ "URL": "https://github.com/rstudio/markdown",
+ "BugReports": "https://github.com/rstudio/markdown/issues",
+ "VignetteBuilder": "knitr",
+ "RoxygenNote": "7.2.3",
+ "Encoding": "UTF-8",
+ "NeedsCompilation": "no",
+ "Packaged": "2023-01-31 15:34:10 UTC; yihui",
+ "Author": "JJ Allaire [aut],\n Jeffrey Horner [aut],\n Yihui Xie [aut, cre] (),\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 RStudio [cph]",
+ "Maintainer": "Yihui Xie ",
+ "Repository": "CRAN",
+ "Date/Publication": "2023-01-31 17:20:05 UTC",
+ "Built": "R 4.2.0; ; 2023-02-01 13:02:06 UTC; unix"
+ }
+ },
+ "memoise": {
+ "Source": "CRAN",
+ "Repository": "https://cran.rstudio.com",
+ "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": "CRAN",
+ "Date/Publication": "2021-11-26 16:11:10 UTC",
+ "Built": "R 4.2.0; ; 2022-04-25 03:43:41 UTC; unix"
+ }
+ },
+ "mgcv": {
+ "Source": "CRAN",
+ "Repository": "https://cran.rstudio.com",
+ "description": {
+ "Package": "mgcv",
+ "Version": "1.8-41",
+ "Author": "Simon Wood ",
+ "Maintainer": "Simon Wood ",
+ "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": "2022-10-21 11:50:05 UTC; sw283",
+ "Repository": "CRAN",
+ "Date/Publication": "2022-10-21 13:52:37 UTC",
+ "Built": "R 4.2.2; x86_64-apple-darwin17.0; 2022-10-31 22:34:20 UTC; unix"
+ }
+ },
+ "mime": {
+ "Source": "CRAN",
+ "Repository": "https://cran.rstudio.com",
+ "description": {
+ "Package": "mime",
+ "Type": "Package",
+ "Title": "Map Filenames to MIME Types",
+ "Version": "0.12",
+ "Authors@R": "c(\n person(\"Yihui\", \"Xie\", role = c(\"aut\", \"cre\"), email = \"xie@yihui.name\", comment = c(ORCID = \"0000-0003-0645-5666\")),\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.1.1",
+ "Encoding": "UTF-8",
+ "NeedsCompilation": "yes",
+ "Packaged": "2021-09-28 02:06:04 UTC; yihui",
+ "Author": "Yihui Xie [aut, cre] (),\n Jeffrey Horner [ctb],\n Beilei Bian [ctb]",
+ "Maintainer": "Yihui Xie ",
+ "Repository": "CRAN",
+ "Date/Publication": "2021-09-28 05:00:05 UTC",
+ "Built": "R 4.2.0; x86_64-apple-darwin17.0; 2022-04-25 03:05:47 UTC; unix",
+ "Archs": "mime.so.dSYM"
+ }
+ },
+ "miniUI": {
+ "Source": "CRAN",
+ "Repository": "https://cran.rstudio.com",
+ "description": {
+ "Package": "miniUI",
+ "Type": "Package",
+ "Title": "Shiny UI Widgets for Small Screens",
+ "Version": "0.1.1.1",
+ "Authors@R": "c(\n person(\"Joe\", \"Cheng\", role = c(\"cre\", \"aut\"), email = \"joe@rstudio.com\"),\n person(family = \"RStudio\", role = \"cph\")\n )",
+ "Description": "Provides UI widget and layout functions for writing Shiny apps\n that work well on small screens.",
+ "License": "GPL-3",
+ "LazyData": "TRUE",
+ "Imports": "shiny (>= 0.13), htmltools (>= 0.3), utils",
+ "RoxygenNote": "5.0.1",
+ "NeedsCompilation": "no",
+ "Packaged": "2018-05-18 17:00:34 UTC; jcheng",
+ "Author": "Joe Cheng [cre, aut],\n RStudio [cph]",
+ "Maintainer": "Joe Cheng ",
+ "Repository": "CRAN",
+ "Date/Publication": "2018-05-18 18:37:18 UTC",
+ "Built": "R 4.2.0; ; 2022-04-27 21:48:37 UTC; unix"
+ }
+ },
+ "modelr": {
+ "Source": "CRAN",
+ "Repository": "https://cran.rstudio.com",
+ "description": {
+ "Package": "modelr",
+ "Title": "Modelling Functions that Work with the Pipe",
+ "Version": "0.1.10",
+ "Authors@R": "c(\n person(\"Hadley\", \"Wickham\", , \"hadley@rstudio.com\", role = c(\"aut\", \"cre\")),\n person(\"RStudio\", role = c(\"cph\", \"fnd\"))\n )",
+ "Description": "Functions for modelling that help you seamlessly integrate\n modelling into a pipeline of data manipulation and visualisation.",
+ "License": "GPL-3",
+ "URL": "https://modelr.tidyverse.org, https://github.com/tidyverse/modelr",
+ "BugReports": "https://github.com/tidyverse/modelr/issues",
+ "Depends": "R (>= 3.2)",
+ "Imports": "broom, magrittr, purrr (>= 0.2.2), rlang (>= 1.0.6), tibble,\ntidyr (>= 0.8.0), tidyselect, vctrs",
+ "Suggests": "compiler, covr, ggplot2, testthat (>= 3.0.0)",
+ "Config/Needs/website": "tidyverse/tidytemplate",
+ "Encoding": "UTF-8",
+ "LazyData": "true",
+ "RoxygenNote": "7.2.1",
+ "Config/testthat/edition": "3",
+ "NeedsCompilation": "no",
+ "Packaged": "2022-11-11 16:14:48 UTC; hadleywickham",
+ "Author": "Hadley Wickham [aut, cre],\n RStudio [cph, fnd]",
+ "Maintainer": "Hadley Wickham ",
+ "Repository": "CRAN",
+ "Date/Publication": "2022-11-11 19:20:02 UTC",
+ "Built": "R 4.2.0; ; 2022-11-12 12:58:52 UTC; unix"
+ }
+ },
+ "munsell": {
+ "Source": "CRAN",
+ "Repository": "https://cran.rstudio.com",
+ "description": {
+ "Package": "munsell",
+ "Type": "Package",
+ "Title": "Utilities for Using Munsell Colours",
+ "Version": "0.5.0",
+ "Author": "Charlotte Wickham