Clean Slate / Remove Packages and Clear Memory

knitr::opts_chunk$set(echo = TRUE)


# Clear the workspace
  rm(list = ls())  # Clear environment
  gc()             # Clear unused memory / Take out the trash
##          used (Mb) gc trigger (Mb) limit (Mb) max used (Mb)
## Ncells 519667 27.8    1150124 61.5         NA   669277 35.8
## Vcells 955825  7.3    8388608 64.0      32768  1840488 14.1
  cat("\f")        # Clear the console
  if(!is.null(dev.list())) dev.off() # Clear all plots
## null device 
##           1
# Remove Packages
lapply(names(sessionInfo()$otherPkgs), function(pkgs)
  detach(paste0('package:', pkgs), character.only = T, unload = T, force = T))
## list()

Load

Load R Packages

######Libraries#############################
suppressWarnings({
require(Amelia)             # Amelia - Handling missing data using multiple imputation.
require(broom)              # broom - Converting statistical analysis objects into tidy data frames.
require(car)                # car - Companion to applied regression, provides various functions for regression analysis.
require(caret)              # caret - Classification and regression training, unified interface for various machine learning models.
require(corrplot)           # corrplot - Visualization of correlation matrices using colored plots.
require(dplyr)              # dplyr - Data manipulation and transformation package for data frames.
require(e1071)              # e1071 - Various functions for statistical classification, clustering, and regression.
require(fastDummies)        # fastDummies - Creating dummy variables from categorical data.
require(fmsb)               # fmsb - Functions for medical statistics book.
require(ggplot2)            # ggplot2 - Grammar of graphics, a powerful plotting system.
require(ggcorrplot)         # ggcorrplot - Visualization of correlation matrices using ggplot2.
require(ggExtra)            # ggExtra - Additional functions and extensions for ggplot2.
require(glmnet)             # glmnet - Lasso and elastic-net regularized generalized linear models.
require(glmpath)            # glmpath - L1 regularization path for generalized linear models.
require(grid)               # grid - Grid graphics system for creating and arranging plots.
require(gridExtra)          # gridExtra - Miscellaneous functions for "grid" graphics.
require(kableExtra)         # kableExtra - Table formatting and customization in knitr and R Markdown.
require(knitr)              # knitr - Dynamic report generation in R.
require(leaflet)            # leaflet - Interactive maps with the Leaflet JavaScript library.
require(leaflet.extras)     # leaflet.extras - Extra functionality for leaflet maps.
require(leaps)              # leaps - Regression subset selection.
require(maptools)           # maptools - Tools for reading and handling spatial objects.
require(MASS)               # MASS - Functions and datasets for Venables and Ripley's MASS.
require(imbalance)          # imbalance - Methods for handling imbalanced datasets.
require(MLmetrics)          # MLmetrics - Machine learning evaluation metrics.
require(mlpack)             # mlpack - C++ machine learning library integration in R.
require(neuralnet)          # neuralnet - Training of neural networks.
require(psych)              # psych - Procedures for psychological, psychometric, and personality research.
require(raster)             # raster - Reading, writing, and processing raster data.
require(RColorBrewer)       # RColorBrewer - Color palettes for maps and plots.
require(ResourceSelection)  # ResourceSelection - Resource selection (probability) functions for use-availability data.
require(reticulate)         # reticulate - Interface to Python modules, classes, and functions.
require(rgdal)              # rgdal - Interface to GDAL for reading and writing spatial data.
require(rgeos)              # rgeos - Interface to Geometry Engine Open Source (GEOS).
require(shiny)              # shiny - Web application framework for interactive data visualization.
require(sf)                 # sf - Simple Features for R, handling spatial data.
require(sjPlot)             # sjPlot - Data visualization and results from statistical models.
require(sp)                 # sp - Classes and methods for spatial data.
require(tidyverse)          # tidyverse - Collection of packages for data manipulation and visualization.
})    
## Loading required package: Amelia
## Loading required package: Rcpp
## ## 
## ## Amelia II: Multiple Imputation
## ## (Version 1.8.1, built: 2022-11-18)
## ## Copyright (C) 2005-2023 James Honaker, Gary King and Matthew Blackwell
## ## Refer to http://gking.harvard.edu/amelia/ for more information
## ##
## Loading required package: broom
## Loading required package: car
## Loading required package: carData
## Loading required package: caret
## Loading required package: ggplot2
## Loading required package: lattice
## Loading required package: corrplot
## corrplot 0.92 loaded
## Loading required package: dplyr
## 
## Attaching package: 'dplyr'
## The following object is masked from 'package:car':
## 
##     recode
## The following objects are masked from 'package:stats':
## 
##     filter, lag
## The following objects are masked from 'package:base':
## 
##     intersect, setdiff, setequal, union
## Loading required package: e1071
## Loading required package: fastDummies
## Loading required package: fmsb
## Registered S3 methods overwritten by 'fmsb':
##   method    from
##   print.roc pROC
##   plot.roc  pROC
## Loading required package: ggcorrplot
## Loading required package: ggExtra
## Loading required package: glmnet
## Loading required package: Matrix
## Loaded glmnet 4.1-6
## Loading required package: glmpath
## Loading required package: survival
## 
## Attaching package: 'survival'
## The following object is masked from 'package:caret':
## 
##     cluster
## Loading required package: grid
## Loading required package: gridExtra
## 
## Attaching package: 'gridExtra'
## The following object is masked from 'package:dplyr':
## 
##     combine
## Loading required package: kableExtra
## 
## Attaching package: 'kableExtra'
## The following object is masked from 'package:dplyr':
## 
##     group_rows
## Loading required package: knitr
## Loading required package: leaflet
## Loading required package: leaflet.extras
## Loading required package: leaps
## Loading required package: maptools
## Loading required package: sp
## Checking rgeos availability: TRUE
## Please note that 'maptools' will be retired during 2023,
## plan transition at your earliest convenience;
## some functionality will be moved to 'sp'.
## 
## Attaching package: 'maptools'
## The following object is masked from 'package:car':
## 
##     pointLabel
## Loading required package: MASS
## 
## Attaching package: 'MASS'
## The following object is masked from 'package:dplyr':
## 
##     select
## Loading required package: imbalance
## Loading required package: MLmetrics
## 
## Attaching package: 'MLmetrics'
## The following objects are masked from 'package:caret':
## 
##     MAE, RMSE
## The following object is masked from 'package:base':
## 
##     Recall
## Loading required package: mlpack
## Loading required package: neuralnet
## 
## Attaching package: 'neuralnet'
## The following object is masked from 'package:dplyr':
## 
##     compute
## Loading required package: psych
## 
## Attaching package: 'psych'
## The following object is masked from 'package:MLmetrics':
## 
##     AUC
## The following objects are masked from 'package:ggplot2':
## 
##     %+%, alpha
## The following object is masked from 'package:car':
## 
##     logit
## Loading required package: raster
## 
## Attaching package: 'raster'
## The following object is masked from 'package:MASS':
## 
##     select
## The following object is masked from 'package:dplyr':
## 
##     select
## Loading required package: RColorBrewer
## Loading required package: ResourceSelection
## ResourceSelection 0.3-5   2019-07-22
## Loading required package: reticulate
## Loading required package: rgdal
## Please note that rgdal will be retired during 2023,
## plan transition to sf/stars/terra functions using GDAL and PROJ
## at your earliest convenience.
## See https://r-spatial.org/r/2022/04/12/evolution.html and https://github.com/r-spatial/evolution
## rgdal: version: 1.6-6, (SVN revision 1201)
## Geospatial Data Abstraction Library extensions to R successfully loaded
## Loaded GDAL runtime: GDAL 3.4.2, released 2022/03/08
## Path to GDAL shared files: /Users/arvindsharma/Library/R/x86_64/4.2/library/rgdal/gdal
## GDAL binary built with GEOS: FALSE 
## Loaded PROJ runtime: Rel. 8.2.1, January 1st, 2022, [PJ_VERSION: 821]
## Path to PROJ shared files: /Users/arvindsharma/Library/R/x86_64/4.2/library/rgdal/proj
## PROJ CDN enabled: FALSE
## Linking to sp version:1.6-0
## To mute warnings of possible GDAL/OSR exportToProj4() degradation,
## use options("rgdal_show_exportToProj4_warnings"="none") before loading sp or rgdal.
## Loading required package: rgeos
## rgeos version: 0.6-2, (SVN revision 693)
##  GEOS runtime version: 3.10.2-CAPI-1.16.0 
##  Please note that rgeos will be retired during 2023,
## plan transition to sf functions using GEOS at your earliest convenience.
##  GEOS using OverlayNG
##  Linking to sp version: 1.6-0 
##  Polygon checking: TRUE
## 
## Attaching package: 'rgeos'
## The following object is masked from 'package:dplyr':
## 
##     symdiff
## Loading required package: shiny
## 
## Attaching package: 'shiny'
## The following object is masked from 'package:ggExtra':
## 
##     runExample
## Loading required package: sf
## Linking to GEOS 3.10.2, GDAL 3.4.2, PROJ 8.2.1; sf_use_s2() is TRUE
## Loading required package: sjPlot
## Install package "strengejacke" from GitHub (`devtools::install_github("strengejacke/strengejacke")`) to load all sj-packages at once!
## Loading required package: tidyverse
## ── Attaching core tidyverse packages ──────────────────────── tidyverse 2.0.0 ──
## ✔ forcats   1.0.0     ✔ stringr   1.5.1
## ✔ lubridate 1.9.2     ✔ tibble    3.2.1
## ✔ purrr     1.0.2     ✔ tidyr     1.3.0
## ✔ readr     2.1.4     
## ── Conflicts ────────────────────────────────────────── tidyverse_conflicts() ──
## ✖ psych::%+%()             masks ggplot2::%+%()
## ✖ psych::alpha()           masks ggplot2::alpha()
## ✖ gridExtra::combine()     masks dplyr::combine()
## ✖ neuralnet::compute()     masks dplyr::compute()
## ✖ tidyr::expand()          masks Matrix::expand()
## ✖ tidyr::extract()         masks raster::extract()
## ✖ dplyr::filter()          masks stats::filter()
## ✖ kableExtra::group_rows() masks dplyr::group_rows()
## ✖ dplyr::lag()             masks stats::lag()
## ✖ purrr::lift()            masks caret::lift()
## ✖ tidyr::pack()            masks Matrix::pack()
## ✖ dplyr::recode()          masks car::recode()
## ✖ raster::select()         masks MASS::select(), dplyr::select()
## ✖ purrr::some()            masks car::some()
## ✖ rgeos::symdiff()         masks dplyr::symdiff()
## ✖ tidyr::unpack()          masks Matrix::unpack()
## ℹ Use the conflicted package (<http://conflicted.r-lib.org/>) to force all conflicts to become errors
############################################

Load Functions

myprint=function(x){print(x)}

mycite=function(x){citation(x)}

corfunction=function(d){
  
  mycorr  = cor(x = d[, 1:ncol(d)])
  
  p.mat   = ggcorrplot::cor_pmat(d[,1:ncol(d)])
  
  myplot  = ggcorrplot(corr = mycorr, 
                       hc.order=TRUE,
                       type="lower", 
                       colors=c("red", "white","green"),
                       tl.cex = 8, 
                       tl.col = "black", 
                       lab=TRUE, 
                       lab_size=2, 
                       p.mat=p.mat,
                       insig="pch", 
                       pch=4
                       )
  print(myplot)
}

Load Geography & Flat Files

# setwd("C:/Users/lfult/Documents/Bankruptcy Study/")
setwd("/Users/arvindsharma/Library/CloudStorage/GoogleDrive-sharmaar@bc.edu/My Drive/hospital_bankrutcy/raw_data/shapefiles/cb_2018_us_county_20m/")

myshape=raster::shapefile("cb_2018_us_county_20m.shp") #shape file
## Warning in .getSpatDF(x@ptr$df, ...): NAs introduced by coercion to integer
## range

## Warning in .getSpatDF(x@ptr$df, ...): NAs introduced by coercion to integer
## range
myshape$M=as.numeric(myshape$STATEFP)

Load Flat Files

bankrupt0 <- read.csv('/Users/arvindsharma/Library/CloudStorage/GoogleDrive-sharmaar@bc.edu/My Drive/hospital_bankrutcy/raw_data/lags_final3.csv', stringsAsFactors = T)

bankrupt <- bankrupt0

bankrupt$AR_by_OpIncome <- as.numeric(bankrupt$AR_by_OpIncome)
missmap(obj = bankrupt, 
        x.cex=.5
        )

Merge Files

Create a data frame (formap) that summarizes the bankruptcies based on the GeoCode for states (52).

myf <- function(x) mean(x)
formap <- as.data.frame(x = aggregate(x   = bankrupt$Bankrupt,
                                      by  = list(bankrupt$GeoCode), 
                                      FUN = myf
                                      )
                     )
colnames(formap) <- c('M','Bankrupt')

formap=sp::merge(x  = myshape,
                 y  = formap, 
                 by ="M", 
                 all.x =F # only the rows with matching values in "M"/states from the myshape data frame are retained in the result.
                 )

temp   = formap
formap = NULL

GIS

Map of bankruptcies

  • Using the leaflet package in R to create an interactive map with color-coded polygons representing different states. Here’s a breakdown of the code:
?colorBin
qpal<-colorBin(palette = c("green", "yellow","orange", "red", "black"),
               bins = 5, 
               domain = 0:2/10
               )

leaf=leaflet(temp) %>%
  addTiles(group = "OSM (default)"
           ) %>%
  addMapPane(name = "borders", 
             zIndex = 410
             ) %>%
  addPolylines(data = temp,
               color = "black",
               opacity = 1, 
               weight = 1, 
               group="Borders", 
               options = pathOptions(pane="borders")
               )%>%
  fitBounds(lng1 = -124.8,
            lat1 = -66.9,
            lng2 =  24.4,
            lat2 = 49.4) %>% setView(lng = -98.6,
                                     lat =  39.83,
                                     zoom = 4
                                     )%>%
  addPolygons(stroke = FALSE,
              fillOpacity = 1, 
              smoothFactor = 0.2, 
              color = ~qpal(temp@data$Bankrupt), 
              popup = paste("State: ", temp@data$NAME, "<br>", 
                            "Bankruptices: ", temp@data$Bankrupt, "<br>")
                            )%>%
  addLegend(data=temp, 
            position = "bottomright", 
            opacity=1, 
            pal = qpal, 
            values = ~temp@data$Bankrupt, 
            title = "% Bankruptcies"
            )

leaf
rm(temp)

Drop Variables

bankrupt$NewIndex = bankrupt$HospID = bankrupt$Name = bankrupt$City = bankrupt$State = bankrupt$GeoCode = NULL

Descriptive & Correlations

Descriptives

myprint(round(x = describe(x = bankrupt, 
                           IQR=TRUE, 
                           quant=c(.25,.75)
                           ),
              digits = 3)
        )
##                           vars    n          mean           sd     median
## Bankrupt                     1 3091  2.000000e-02 1.400000e-01       0.00
## Year                         2 3091  2.015270e+03 3.980000e+00    2016.00
## AR_by_OpIncome               3 3091  3.735590e+03 2.543550e+03    4058.00
## FB_Plus_OpInc_ByFB           4 3091  1.330000e+00 1.322000e+01       1.02
## PercentMedicaidDays          5 3091  9.000000e-02 9.000000e-02       0.06
## PercentMedicareDays          6 3091  3.100000e-01 1.100000e-01       0.30
## CurrentRatio                 7 3091  5.230000e+00 1.289900e+02       1.82
## Debt2Equity                  8 3091 -1.700000e-01 3.805000e+01       0.32
## DaysSalesOutstanding         9 3091  5.555000e+01 1.246600e+02      48.09
## LaborCompRatio              10 3091  4.500000e-01 1.900000e-01       0.42
## OpProfitMargin              11 3091 -3.000000e-02 3.300000e-01      -0.01
## DaysCashOnHand              12 3091  4.967000e+01 1.372500e+02      13.55
## BedUtil                     13 3091  5.000000e-01 2.000000e-01       0.52
## AdjPxDays                   14 3091  9.086425e+04 1.000076e+05   61010.41
## Alt1Ohls3                   15 3091 -2.445801e+07 6.611608e+08       0.13
## AltmanX2                    16 3091 -1.594501e+07 5.424914e+08       0.03
## AltmanX3                    17 3091 -4.899867e+06 1.415789e+08       0.05
## AltmanX4                    18 3091  2.670101e+08 4.532672e+09       0.07
## OhlsonX1                    19 3091  1.204000e+01 2.190000e+00      12.18
## OhlsonX2                    20 3091 -1.117245e+07 7.414641e+08       0.45
## OhlsonX4                    21 3091  4.800000e-01 1.207000e+01       0.49
## OhlsonX6                    22 3091 -6.231568e+06 2.266328e+08       0.05
## OhlsonX7                    23 3091  2.863766e+08 2.552897e+09       0.10
## OhlsonX9                    24 3091  1.145670e+07 1.251940e+08 3001155.00
## OhlsonX5                    25 3091  1.900000e-01 3.900000e-01       0.00
## OhlsonX8                    26 3091  2.600000e-01 4.400000e-01       0.00
## Govt                        27 3091  1.400000e-01 3.500000e-01       0.00
## Urban                       28 3091  1.000000e-01 3.000000e-01       0.00
## ForProfit                   29 3091  2.400000e-01 4.200000e-01       0.00
## HC1                         30 3091  6.000000e-02 2.300000e-01       0.00
## HC2                         31 3091  2.000000e-01 4.000000e-01       0.00
## HC4                         32 3091  2.500000e-01 4.300000e-01       0.00
## HC5                         33 3091  1.200000e-01 3.300000e-01       0.00
## AR_by_OpIncome.y.1.         34 3091  3.751320e+03 2.533700e+03    4135.00
## FB_Plus_OpInc_ByFB.y.1.     35 3091  1.750000e+00 2.970000e+01       1.02
## PercentMedicaidDays.y.1.    36 3091  9.000000e-02 9.000000e-02       0.06
## PercentMedicareDays.y.1.    37 3091  3.100000e-01 1.100000e-01       0.30
## CurrentRatio.y.1.           38 3091  3.140000e+00 3.443000e+01       1.88
## Debt2Equity.y.1.            39 3091  2.940000e+00 1.013900e+02       0.32
## DaysSalesOutstanding.y.1.   40 3091  5.568000e+01 1.133500e+02      48.26
## LaborCompRatio.y.1.         41 3091  4.400000e-01 1.500000e-01       0.42
## OpProfitMargin.y.1.         42 3091 -2.000000e-02 2.600000e-01       0.00
## DaysCashOnHand.y.1.         43 3091  4.773000e+01 1.286500e+02      13.42
## BedUtil.y.1.                44 3091  5.100000e-01 1.900000e-01       0.52
## AdjPxDays.y.1.              45 3091  8.917570e+04 9.801766e+04   59838.57
## Alt1Ohls3.y.1.              46 3091 -1.830442e+07 4.335052e+08       0.14
## AltmanX2.y.1.               47 3091 -6.227984e+06 2.560468e+08       0.03
## AltmanX3.y.1.               48 3091 -9.458751e+05 3.631657e+07       0.05
## AltmanX4.y.1.               49 3091  2.407713e+08 1.653409e+09       0.06
## OhlsonX1.y.1.               50 3091  1.204000e+01 1.920000e+00      12.16
## OhlsonX2.y.1.               51 3091  3.953532e+06 1.016720e+08       0.45
## OhlsonX4.y.1.               52 3091  5.600000e-01 4.710000e+00       0.49
## OhlsonX6.y.1.               53 3091 -1.301918e+06 4.022901e+07       0.04
## OhlsonX7.y.1.               54 3091  3.029585e+08 1.706703e+09       0.10
## OhlsonX9.y.1.               55 3091  8.619685e+06 1.313818e+08 2774170.00
## OhlsonX5.y.1.               56 3091  1.800000e-01 3.800000e-01       0.00
## OhlsonX8.y.1.               57 3091  2.700000e-01 4.400000e-01       0.00
## HC4_5.y.1.                  58 3091  3.700000e-01 4.800000e-01       0.00
## AR_by_OpIncome.y.2.         59 3091  3.880950e+03 2.542710e+03    4315.00
## FB_Plus_OpInc_ByFB.y.2.     60 3091  9.500000e-01 1.108000e+01       1.02
## PercentMedicaidDays.y.2.    61 3091  9.000000e-02 9.000000e-02       0.06
## PercentMedicareDays.y.2.    62 3091  3.100000e-01 1.100000e-01       0.30
## CurrentRatio.y.2.           63 3091  4.350000e+00 7.997000e+01       1.94
## Debt2Equity.y.2.            64 3091 -1.010000e+00 7.720000e+01       0.32
## DaysSalesOutstanding.y.2.   65 3091  5.620000e+01 9.183000e+01      48.96
## LaborCompRatio.y.2.         66 3091  4.400000e-01 1.600000e-01       0.42
## OpProfitMargin.y.2.         67 3091 -2.000000e-02 3.200000e-01       0.00
## DaysCashOnHand.y.2.         68 3091  4.358000e+01 1.194100e+02      12.98
## BedUtil.y.2.                69 3091  5.100000e-01 1.900000e-01       0.52
## AdjPxDays.y.2.              70 3091  8.813934e+04 9.623804e+04   59052.01
## Alt1Ohls3.y.2.              71 3091 -2.216925e+07 4.377270e+08       0.14
## AltmanX2.y.2.               72 3091 -4.075977e+07 1.380976e+09       0.02
## AltmanX3.y.2.               73 3091 -5.964158e+05 1.231702e+08       0.05
## AltmanX4.y.2.               74 3091  1.854853e+08 3.993410e+09       0.04
## OhlsonX1.y.2.               75 3091  1.197000e+01 2.160000e+00      12.13
## OhlsonX2.y.2.               76 3091  9.217425e+06 1.881989e+08       0.45
## OhlsonX4.y.2.               77 3091  1.070000e+00 3.030000e+01       0.47
## OhlsonX6.y.2.               78 3091  3.688414e+06 3.693899e+08       0.04
## OhlsonX7.y.2.               79 3091  3.005484e+08 1.759180e+09       0.11
## OhlsonX9.y.2.               80 3091  1.491405e+07 1.706167e+08 1826434.00
## OhlsonX5.y.2.               81 3091  1.700000e-01 3.700000e-01       0.00
## OhlsonX8.y.2.               82 3091  2.700000e-01 4.400000e-01       0.00
## D_AR_by_OpIncome            83 3091  2.150000e+00 2.429000e+01       0.00
## D_FB_Plus_OpInc_ByFB        84 3091  6.000000e-02 2.314000e+01      -0.01
## D_CurrentRatio              85 3091 -1.700000e-01 4.020000e+00      -0.02
## D_Debt2Equity               86 3091 -9.000000e-02 2.020000e+01      -0.03
## D_LiabFundBalRatio          87 3091 -7.000000e-01 2.944000e+01      -0.03
## D_DaysSalesOutstanding      88 3091 -1.400000e+00 8.311000e+01      -0.01
## D_LaborCompRatio            89 3091  2.000000e-02 3.500000e-01       0.00
## D_OpProfitMargin            90 3091 -2.000000e-01 3.770000e+00      -0.07
## D_DaysCashOnHand            91 3091  7.340000e+00 4.284600e+02       0.00
## D_BedUtil                   92 3091  3.000000e-02 9.800000e-01       0.00
## D_AdjPxDays                 93 3091  1.902000e+01 1.054970e+03       0.01
## D_Alt1Ohls3                 94 3091 -3.046744e+07 1.630871e+09       0.00
## D_AltmanX2                  95 3091  3.211872e+07 1.371175e+09      -0.50
## D_AltmanX3                  96 3091  2.412699e+07 8.252692e+08      -0.07
## D_AltmanX4                  97 3091 -1.201230e+09 5.318602e+10      -0.55
## D_OhlsonX1                  98 3091 -1.000000e-02 1.500000e-01       0.00
## D_OhlsonX2                  99 3091 -1.881033e+06 1.072912e+09       0.00
## D_OhlsonX4                 100 3091  1.200000e-01 3.980000e+00       0.00
## D_OhlsonX6                 101 3091  2.513597e+07 1.013776e+09      -0.13
## D_OhlsonX7                 102 3091  1.468682e+08 4.177040e+09      -0.08
## D_OhlsonX9                 103 3091  8.777139e+05 4.184137e+07      -0.50
##                              trimmed         mad           min          max
## Bankrupt                        0.00        0.00  0.000000e+00 1.000000e+00
## Year                         2015.38        4.45  2.008000e+03 2.021000e+03
## AR_by_OpIncome               3667.31     3270.62  3.000000e+00 8.592000e+03
## FB_Plus_OpInc_ByFB              1.02        0.19 -4.289000e+01 6.986900e+02
## PercentMedicaidDays             0.07        0.04  0.000000e+00 9.800000e-01
## PercentMedicareDays             0.30        0.10  0.000000e+00 8.700000e-01
## CurrentRatio                    1.99        1.35 -4.645900e+02 7.098050e+03
## Debt2Equity                     0.38        0.46 -1.922500e+03 4.077900e+02
## DaysSalesOutstanding           48.80       11.80 -1.972370e+03 4.282780e+03
## LaborCompRatio                  0.43        0.12  1.000000e-02 6.340000e+00
## OpProfitMargin                 -0.01        0.12 -1.046000e+01 8.000000e-01
## DaysCashOnHand                 27.07       20.12 -7.541700e+02 3.060150e+03
## BedUtil                         0.51        0.22  0.000000e+00 1.000000e+00
## AdjPxDays                   72361.99    58123.93  2.790000e+00 1.258166e+06
## Alt1Ohls3                       0.15        0.18 -2.069512e+10 1.716643e+10
## AltmanX2                        0.03        0.09 -2.401988e+10 2.003558e+09
## AltmanX3                        0.06        0.12 -6.057755e+09 1.405591e+09
## AltmanX4                        0.14        0.22 -1.500000e+11 1.520000e+11
## OhlsonX1                       12.17        1.38 -1.115000e+01 1.724000e+01
## OhlsonX2                        0.48        0.36 -3.619138e+10 4.035141e+09
## OhlsonX4                        0.57        0.34 -6.426000e+02 8.697000e+01
## OhlsonX6                        0.06        0.09 -1.187764e+10 2.003558e+09
## OhlsonX7                        0.26        0.28 -1.000000e+11 2.906021e+10
## OhlsonX9                  7700594.97 13458012.39 -1.778187e+09 2.986955e+09
## OhlsonX5                        0.11        0.00  0.000000e+00 1.000000e+00
## OhlsonX8                        0.20        0.00  0.000000e+00 1.000000e+00
## Govt                            0.05        0.00  0.000000e+00 1.000000e+00
## Urban                           0.00        0.00  0.000000e+00 1.000000e+00
## ForProfit                       0.17        0.00  0.000000e+00 1.000000e+00
## HC1                             0.00        0.00  0.000000e+00 1.000000e+00
## HC2                             0.12        0.00  0.000000e+00 1.000000e+00
## HC4                             0.18        0.00  0.000000e+00 1.000000e+00
## HC5                             0.03        0.00  0.000000e+00 1.000000e+00
## AR_by_OpIncome.y.1.          3691.24     3175.73  2.000000e+00 8.603000e+03
## FB_Plus_OpInc_ByFB.y.1.         1.02        0.19 -2.297900e+02 1.378650e+03
## PercentMedicaidDays.y.1.        0.07        0.04  0.000000e+00 9.800000e-01
## PercentMedicareDays.y.1.        0.30        0.10  0.000000e+00 8.700000e-01
## CurrentRatio.y.1.               2.06        1.35 -7.873100e+02 1.482250e+03
## Debt2Equity.y.1.                0.42        0.47 -6.275700e+02 4.467920e+03
## DaysSalesOutstanding.y.1.      48.97       11.92 -1.647780e+03 3.816810e+03
## LaborCompRatio.y.1.             0.43        0.12 -4.900000e-01 1.970000e+00
## OpProfitMargin.y.1.             0.00        0.10 -6.890000e+00 3.420000e+00
## DaysCashOnHand.y.1.            26.21       19.96 -1.292660e+03 2.814090e+03
## BedUtil.y.1.                    0.51        0.21  0.000000e+00 1.000000e+00
## AdjPxDays.y.1.              71400.36    57279.33  1.030000e+00 1.415587e+06
## Alt1Ohls3.y.1.                  0.15        0.16 -1.393858e+10 3.015305e+08
## AltmanX2.y.1.                   0.02        0.09 -1.398103e+10 2.097515e+08
## AltmanX3.y.1.                   0.06        0.10 -1.542306e+09 5.250694e+08
## AltmanX4.y.1.                   0.13        0.22 -2.914540e+10 2.825674e+10
## OhlsonX1.y.1.                  12.14        1.36 -1.115000e+01 1.712000e+01
## OhlsonX2.y.1.                   0.48        0.36 -2.483980e+07 3.917888e+09
## OhlsonX4.y.1.                   0.55        0.34 -1.835000e+02 7.136000e+01
## OhlsonX6.y.1.                   0.05        0.09 -1.789527e+09 2.097517e+08
## OhlsonX7.y.1.                   0.26        0.27 -2.396372e+10 2.558153e+10
## OhlsonX9.y.1.             6377426.74 12048694.35 -1.308272e+09 5.228494e+09
## OhlsonX5.y.1.                   0.10        0.00  0.000000e+00 1.000000e+00
## OhlsonX8.y.1.                   0.21        0.00  0.000000e+00 1.000000e+00
## HC4_5.y.1.                      0.34        0.00  0.000000e+00 1.000000e+00
## AR_by_OpIncome.y.2.          3839.75     3024.50  6.000000e+00 8.604000e+03
## FB_Plus_OpInc_ByFB.y.2.         1.02        0.18 -3.264500e+02 4.451800e+02
## PercentMedicaidDays.y.2.        0.07        0.04  0.000000e+00 9.800000e-01
## PercentMedicareDays.y.2.        0.30        0.10  0.000000e+00 8.700000e-01
## CurrentRatio.y.2.               2.13        1.32 -9.944000e+01 4.418520e+03
## Debt2Equity.y.2.                0.43        0.47 -3.255210e+03 4.554200e+02
## DaysSalesOutstanding.y.2.      49.93       12.66 -1.931850e+03 2.455250e+03
## LaborCompRatio.y.2.             0.42        0.12 -1.990000e+00 4.580000e+00
## OpProfitMargin.y.2.             0.00        0.10 -9.570000e+00 8.190000e+00
## DaysCashOnHand.y.2.            24.34       19.24 -1.576700e+03 2.385800e+03
## BedUtil.y.2.                    0.52        0.21  0.000000e+00 1.000000e+00
## AdjPxDays.y.2.              70825.14    55406.91  1.040000e+00 1.372553e+06
## Alt1Ohls3.y.2.                  0.16        0.16 -1.303108e+10 1.546664e+09
## AltmanX2.y.2.                   0.03        0.07 -5.695970e+10 1.100960e+09
## AltmanX3.y.2.                   0.06        0.10 -3.464660e+09 4.765823e+09
## AltmanX4.y.2.                   0.12        0.19 -1.540000e+11 1.140000e+11
## OhlsonX1.y.2.                  12.11        1.33 -1.115000e+01 1.700000e+01
## OhlsonX2.y.2.                   0.47        0.36 -6.485320e+07 6.737484e+09
## OhlsonX4.y.2.                   0.53        0.31 -9.859000e+01 1.675990e+03
## OhlsonX6.y.2.                   0.05        0.09 -2.700965e+09 1.998557e+10
## OhlsonX7.y.2.                   0.26        0.25 -2.319753e+10 3.100398e+10
## OhlsonX9.y.2.             6194854.73 10289278.10 -1.539479e+09 5.228494e+09
## OhlsonX5.y.2.                   0.09        0.00  0.000000e+00 1.000000e+00
## OhlsonX8.y.2.                   0.22        0.00  0.000000e+00 1.000000e+00
## D_AR_by_OpIncome                0.09        0.47 -1.000000e+00 1.245000e+03
## D_FB_Plus_OpInc_ByFB           -0.03        0.11 -9.690000e+02 6.228300e+02
## D_CurrentRatio                 -0.03        0.29 -1.260800e+02 2.300000e+01
## D_Debt2Equity                  -0.06        0.27 -7.519800e+02 3.553800e+02
## D_LiabFundBalRatio             -0.03        0.29 -1.422190e+03 1.197100e+02
## D_DaysSalesOutstanding          0.00        0.16 -4.557000e+03 5.583800e+02
## D_LaborCompRatio                0.00        0.07 -5.670000e+00 1.500000e+01
## D_OpProfitMargin               -0.12        0.72 -1.010000e+02 7.800000e+01
## D_DaysCashOnHand                0.04        0.58 -1.522800e+04 1.694500e+04
## D_BedUtil                      -0.01        0.09 -1.000000e+00 5.300000e+01
## D_AdjPxDays                     0.01        0.08 -9.500000e-01 5.865315e+04
## D_Alt1Ohls3                    -0.04        0.40 -8.997879e+10 3.052270e+09
## D_AltmanX2                     -0.54        1.24 -1.708382e+08 7.506213e+10
## D_AltmanX3                     -0.11        0.64 -1.539000e+03 3.406117e+10
## D_AltmanX4                     -0.54        1.26 -2.750000e+12 4.500000e+11
## D_OhlsonX1                      0.00        0.01 -2.310000e+00 1.310000e+00
## D_OhlsonX2                      0.01        0.16 -5.097377e+10 2.615652e+10
## D_OhlsonX4                      0.04        0.29 -1.045000e+02 1.050000e+02
## D_OhlsonX6                     -0.14        0.94 -8.772930e+03 5.543998e+10
## D_OhlsonX7                     -0.08        0.76 -5.342444e+10 1.700000e+11
## D_OhlsonX9                     -0.56        1.33 -3.247753e+08 2.107294e+09
##                                  range   skew kurtosis           se         IQR
## Bankrupt                  1.000000e+00   6.67    42.55         0.00        0.00
## Year                      1.300000e+01  -0.17    -1.22         0.07        7.00
## AR_by_OpIncome            8.589000e+03   0.07    -1.11        45.75     4323.50
## FB_Plus_OpInc_ByFB        7.415800e+02  48.41  2513.64         0.24        0.26
## PercentMedicaidDays       9.800000e-01   2.85    13.22         0.00        0.08
## PercentMedicareDays       8.700000e-01   0.53     1.16         0.00        0.13
## CurrentRatio              7.562640e+03  53.84  2955.16         2.32        1.89
## Debt2Equity               2.330290e+03 -41.24  2114.80         0.68        0.75
## DaysSalesOutstanding      6.255150e+03  16.04   563.71         2.24       16.22
## LaborCompRatio            6.330000e+00  11.58   325.63         0.00        0.17
## OpProfitMargin            1.126000e+01 -15.67   415.86         0.01        0.15
## DaysCashOnHand            3.814320e+03   8.68   126.56         2.47       56.56
## BedUtil                   1.000000e+00  -0.17    -0.68         0.00        0.30
## AdjPxDays                 1.258164e+06   3.16    17.54      1798.80    89928.58
## Alt1Ohls3                 3.786155e+10 -11.46   580.82  11892073.46        0.24
## AltmanX2                  2.602344e+10 -39.06  1591.58   9757607.31        0.12
## AltmanX3                  7.463346e+09 -32.44  1253.23   2546530.57        0.15
## AltmanX4                  3.020000e+11   1.19   809.57  81527617.43        0.32
## OhlsonX1                  2.839000e+01  -6.16    63.18         0.04        1.86
## OhlsonX2                  4.022652e+10 -42.42  1954.27  13336461.37        0.48
## OhlsonX4                  7.295700e+02 -48.79  2607.39         0.22        0.52
## OhlsonX6                  1.388120e+10 -46.90  2440.06   4076366.10        0.12
## OhlsonX7                  1.290602e+11 -17.42   787.17  45918093.28        0.45
## OhlsonX9                  4.765142e+09   2.78   166.96   2251821.95 21045168.00
## OhlsonX5                  1.000000e+00   1.58     0.50         0.01        0.00
## OhlsonX8                  1.000000e+00   1.10    -0.79         0.01        1.00
## Govt                      1.000000e+00   2.05     2.20         0.01        0.00
## Urban                     1.000000e+00   2.62     4.86         0.00        0.00
## ForProfit                 1.000000e+00   1.24    -0.47         0.01        0.00
## HC1                       1.000000e+00   3.82    12.61         0.00        0.00
## HC2                       1.000000e+00   1.52     0.33         0.01        0.00
## HC4                       1.000000e+00   1.18    -0.60         0.01        0.00
## HC5                       1.000000e+00   2.30     3.29         0.01        0.00
## AR_by_OpIncome.y.1.       8.601000e+03   0.04    -1.12        45.57     4309.50
## FB_Plus_OpInc_ByFB.y.1.   1.608440e+03  36.38  1578.78         0.53        0.26
## PercentMedicaidDays.y.1.  9.800000e-01   2.85    13.22         0.00        0.08
## PercentMedicareDays.y.1.  8.700000e-01   0.53     1.16         0.00        0.13
## CurrentRatio.y.1.         2.269560e+03  23.82  1217.63         0.62        1.92
## Debt2Equity.y.1.          5.095490e+03  35.01  1386.14         1.82        0.79
## DaysSalesOutstanding.y.1. 5.464590e+03  16.28   545.21         2.04       16.20
## LaborCompRatio.y.1.       2.460000e+00   1.69     9.92         0.00        0.16
## OpProfitMargin.y.1.       1.031000e+01  -7.54   180.90         0.00        0.15
## DaysCashOnHand.y.1.       4.106750e+03   7.22   111.10         2.31       53.60
## BedUtil.y.1.              1.000000e+00  -0.20    -0.65         0.00        0.29
## AdjPxDays.y.1.            1.415586e+06   3.39    22.33      1763.01    88661.04
## Alt1Ohls3.y.1.            1.424011e+10 -26.67   751.14   7797309.44        0.23
## AltmanX2.y.1.             1.419078e+10 -52.81  2869.19   4605426.85        0.12
## AltmanX3.y.1.             2.067376e+09 -27.92  1163.58    653213.71        0.14
## AltmanX4.y.1.             5.740214e+10   4.88   117.20  29739302.72        0.30
## OhlsonX1.y.1.             2.827000e+01  -5.70    66.50         0.04        1.84
## OhlsonX2.y.1.             3.942728e+09  31.67  1077.73   1828740.41        0.47
## OhlsonX4.y.1.             2.548600e+02 -19.58   814.95         0.09        0.50
## OhlsonX6.y.1.             1.999279e+09 -34.80  1399.90    723585.47        0.12
## OhlsonX7.y.1.             4.954525e+10   5.91    76.56  30697893.26        0.43
## OhlsonX9.y.1.             6.536766e+09  20.28   827.47   2363119.90 18863185.50
## OhlsonX5.y.1.             1.000000e+00   1.70     0.89         0.01        0.00
## OhlsonX8.y.1.             1.000000e+00   1.05    -0.89         0.01        1.00
## HC4_5.y.1.                1.000000e+00   0.55    -1.70         0.01        1.00
## AR_by_OpIncome.y.2.       8.598000e+03   0.01    -1.11        45.74     4314.00
## FB_Plus_OpInc_ByFB.y.2.   7.716300e+02  10.58  1117.86         0.20        0.24
## PercentMedicaidDays.y.2.  9.800000e-01   2.85    13.22         0.00        0.08
## PercentMedicareDays.y.2.  8.700000e-01   0.53     1.16         0.00        0.13
## CurrentRatio.y.2.         4.517960e+03  54.43  2999.59         1.44        1.85
## Debt2Equity.y.2.          3.710630e+03 -37.67  1489.00         1.39        0.78
## DaysSalesOutstanding.y.2. 4.387100e+03   6.54   336.43         1.65       17.20
## LaborCompRatio.y.2.       6.570000e+00   5.22   147.83         0.00        0.15
## OpProfitMargin.y.2.       1.776000e+01  -4.52   407.07         0.01        0.14
## DaysCashOnHand.y.2.       3.962500e+03   6.07    98.14         2.15       48.97
## BedUtil.y.2.              1.000000e+00  -0.20    -0.59         0.00        0.29
## AdjPxDays.y.2.            1.372552e+06   3.42    22.60      1731.00    87407.29
## Alt1Ohls3.y.2.            1.457774e+10 -23.20   590.74   7873245.68        0.22
## AltmanX2.y.2.             5.806066e+10 -37.29  1432.08  24839140.80        0.11
## AltmanX3.y.2.             8.230483e+09   9.28   980.99   2215421.12        0.14
## AltmanX4.y.2.             2.680000e+11 -12.38   959.08  71828103.20        0.28
## OhlsonX1.y.2.             2.815000e+01  -6.31    65.18         0.04        1.80
## OhlsonX2.y.2.             6.802337e+09  26.40   784.74   3385069.49        0.48
## OhlsonX4.y.2.             1.774580e+03  54.64  3018.40         0.54        0.46
## OhlsonX6.y.2.             2.268653e+10  50.89  2769.44   6644089.35        0.11
## OhlsonX7.y.2.             5.420151e+10   6.63    90.84  31641768.38        0.41
## OhlsonX9.y.2.             6.767973e+09  21.35   610.94   3068824.29 16565951.00
## OhlsonX5.y.2.             1.000000e+00   1.78     1.17         0.01        0.00
## OhlsonX8.y.2.             1.000000e+00   1.02    -0.96         0.01        1.00
## D_AR_by_OpIncome          1.246000e+03  44.01  2218.64         0.44        0.66
## D_FB_Plus_OpInc_ByFB      1.591830e+03 -14.94  1206.91         0.42        0.15
## D_CurrentRatio            1.490800e+02 -22.67   639.67         0.07        0.38
## D_Debt2Equity             1.107350e+03 -21.85   817.46         0.36        0.35
## D_LiabFundBalRatio        1.541900e+03 -42.31  1910.53         0.53        0.39
## D_DaysSalesOutstanding    5.115380e+03 -53.25  2918.07         1.50        0.22
## D_LaborCompRatio          2.067000e+01  25.79  1124.82         0.01        0.10
## D_OpProfitMargin          1.790000e+02  -5.92   279.91         0.07        0.96
## D_DaysCashOnHand          3.217300e+04   6.06  1309.82         7.71        0.78
## D_BedUtil                 5.400000e+01  50.92  2735.06         0.02        0.12
## D_AdjPxDays               5.865410e+04  55.54  3084.00        18.98        0.10
## D_Alt1Ohls3               9.303106e+10 -54.34  2990.99  29333913.58        0.56
## D_AltmanX2                7.523297e+10  53.24  2899.45  24662859.98        1.68
## D_AltmanX3                3.406117e+10  38.72  1518.60  14843835.26        0.89
## D_AltmanX4                3.200000e+12 -46.28  2338.27 956638742.11        1.71
## D_OhlsonX1                3.620000e+00 -12.74   187.86         0.00        0.01
## D_OhlsonX2                7.713030e+10 -28.89  1776.11  19298097.38        0.22
## D_OhlsonX4                2.095000e+02   1.26   378.64         0.07        0.41
## D_OhlsonX6                5.543999e+10  53.04  2886.75  18234435.64        1.23
## D_OhlsonX7                2.234244e+11  32.08  1226.41  75131002.16        1.02
## D_OhlsonX9                2.432069e+09  44.67  2155.07    752586.38        1.80
##                                 Q0.25       Q0.75
## Bankrupt                         0.00        0.00
## Year                          2012.00     2019.00
## AR_by_OpIncome                1483.50     5807.00
## FB_Plus_OpInc_ByFB               0.89        1.15
## PercentMedicaidDays              0.03        0.11
## PercentMedicareDays              0.24        0.37
## CurrentRatio                     1.03        2.92
## Debt2Equity                      0.02        0.77
## DaysSalesOutstanding            40.62       56.84
## LaborCompRatio                   0.35        0.52
## OpProfitMargin                  -0.08        0.07
## DaysCashOnHand                   0.16       56.72
## BedUtil                          0.36        0.66
## AdjPxDays                    27644.73   117573.31
## Alt1Ohls3                        0.03        0.27
## AltmanX2                        -0.03        0.09
## AltmanX3                        -0.02        0.13
## AltmanX4                        -0.05        0.27
## OhlsonX1                        11.25       13.11
## OhlsonX2                         0.23        0.71
## OhlsonX4                         0.30        0.82
## OhlsonX6                         0.00        0.12
## OhlsonX7                        -0.04        0.41
## OhlsonX9                  -2291779.00 18753389.00
## OhlsonX5                         0.00        0.00
## OhlsonX8                         0.00        1.00
## Govt                             0.00        0.00
## Urban                            0.00        0.00
## ForProfit                        0.00        0.00
## HC1                              0.00        0.00
## HC2                              0.00        0.00
## HC4                              0.00        0.00
## HC5                              0.00        0.00
## AR_by_OpIncome.y.1.           1494.00     5803.50
## FB_Plus_OpInc_ByFB.y.1.          0.89        1.15
## PercentMedicaidDays.y.1.         0.03        0.11
## PercentMedicareDays.y.1.         0.24        0.37
## CurrentRatio.y.1.                1.10        3.02
## Debt2Equity.y.1.                 0.02        0.81
## DaysSalesOutstanding.y.1.       40.83       57.02
## LaborCompRatio.y.1.              0.35        0.51
## OpProfitMargin.y.1.             -0.08        0.07
## DaysCashOnHand.y.1.              0.16       53.76
## BedUtil.y.1.                     0.36        0.65
## AdjPxDays.y.1.               27722.86   116383.90
## Alt1Ohls3.y.1.                   0.04        0.27
## AltmanX2.y.1.                   -0.04        0.08
## AltmanX3.y.1.                   -0.01        0.13
## AltmanX4.y.1.                   -0.07        0.23
## OhlsonX1.y.1.                   11.23       13.07
## OhlsonX2.y.1.                    0.24        0.71
## OhlsonX4.y.1.                    0.29        0.79
## OhlsonX6.y.1.                   -0.01        0.11
## OhlsonX7.y.1.                   -0.03        0.40
## OhlsonX9.y.1.             -2832161.50 16031024.00
## OhlsonX5.y.1.                    0.00        0.00
## OhlsonX8.y.1.                    0.00        1.00
## HC4_5.y.1.                       0.00        1.00
## AR_by_OpIncome.y.2.           1529.00     5843.00
## FB_Plus_OpInc_ByFB.y.2.          0.90        1.14
## PercentMedicaidDays.y.2.         0.03        0.11
## PercentMedicareDays.y.2.         0.24        0.37
## CurrentRatio.y.2.                1.18        3.03
## Debt2Equity.y.2.                 0.03        0.81
## DaysSalesOutstanding.y.2.       41.06       58.25
## LaborCompRatio.y.2.              0.35        0.50
## OpProfitMargin.y.2.             -0.07        0.07
## DaysCashOnHand.y.2.              0.15       49.12
## BedUtil.y.2.                     0.37        0.66
## AdjPxDays.y.2.               27970.24   115377.52
## Alt1Ohls3.y.2.                   0.05        0.27
## AltmanX2.y.2.                   -0.03        0.08
## AltmanX3.y.2.                   -0.01        0.13
## AltmanX4.y.2.                   -0.05        0.23
## OhlsonX1.y.2.                   11.22       13.02
## OhlsonX2.y.2.                    0.23        0.71
## OhlsonX4.y.2.                    0.29        0.75
## OhlsonX6.y.2.                   -0.01        0.10
## OhlsonX7.y.2.                   -0.02        0.39
## OhlsonX9.y.2.             -1868869.50 14697081.50
## OhlsonX5.y.2.                    0.00        0.00
## OhlsonX8.y.2.                    0.00        1.00
## D_AR_by_OpIncome                -0.29        0.38
## D_FB_Plus_OpInc_ByFB            -0.10        0.05
## D_CurrentRatio                  -0.22        0.16
## D_Debt2Equity                   -0.25        0.10
## D_LiabFundBalRatio              -0.23        0.16
## D_DaysSalesOutstanding          -0.11        0.11
## D_LaborCompRatio                -0.05        0.05
## D_OpProfitMargin                -0.63        0.33
## D_DaysCashOnHand                -0.40        0.38
## D_BedUtil                       -0.07        0.05
## D_AdjPxDays                     -0.04        0.06
## D_Alt1Ohls3                     -0.33        0.23
## D_AltmanX2                      -1.38        0.30
## D_AltmanX3                      -0.56        0.33
## D_AltmanX4                      -1.38        0.33
## D_OhlsonX1                       0.00        0.01
## D_OhlsonX2                      -0.10        0.12
## D_OhlsonX4                      -0.17        0.23
## D_OhlsonX6                      -0.80        0.43
## D_OhlsonX7                      -0.64        0.38
## D_OhlsonX9                      -1.44        0.36
myprint(round(x = describe(bankrupt[bankrupt$Bankrupt==1,], 
                           IQR=TRUE, 
                           quant=c(.25,.75)
                           ),
              digits = 3)
        )
##                           vars  n          mean           sd      median
## Bankrupt                     1 65          1.00 0.000000e+00        1.00
## Year                         2 65       2015.59 3.260000e+00     2017.00
## AR_by_OpIncome               3 65       2384.34 2.383220e+03     1522.00
## FB_Plus_OpInc_ByFB           4 65         12.16 8.650000e+01        1.12
## PercentMedicaidDays          5 65          0.10 1.100000e-01        0.06
## PercentMedicareDays          6 65          0.32 1.300000e-01        0.30
## CurrentRatio                 7 65          0.36 2.500000e+00        0.56
## Debt2Equity                  8 65        -30.78 2.384300e+02        0.09
## DaysSalesOutstanding         9 65         56.00 4.990000e+01       52.60
## LaborCompRatio              10 65          0.58 7.400000e-01        0.49
## OpProfitMargin              11 65         -0.27 1.300000e+00       -0.10
## DaysCashOnHand              12 65         12.11 2.236000e+01        2.58
## BedUtil                     13 65          0.35 1.800000e-01        0.29
## AdjPxDays                   14 65      36154.68 2.592940e+04    32474.58
## Alt1Ohls3                   15 65          0.07 7.900000e-01        0.06
## AltmanX2                    16 65         -0.04 4.400000e-01       -0.07
## AltmanX3                    17 65         -0.06 3.400000e-01       -0.08
## AltmanX4                    18 65  245509415.36 7.366824e+08       -0.06
## OhlsonX1                    19 65         10.88 1.000000e+00       10.88
## OhlsonX2                    20 65          0.77 1.200000e+00        0.79
## OhlsonX4                    21 65          1.02 2.240000e+00        0.89
## OhlsonX6                    22 65         -0.05 3.000000e-01       -0.06
## OhlsonX7                    23 65  287834156.85 8.200204e+08       -0.08
## OhlsonX9                    24 65    -974983.26 1.748250e+07 -2099769.00
## OhlsonX5                    25 65          0.38 4.900000e-01        0.00
## OhlsonX8                    26 65          0.68 4.700000e-01        1.00
## Govt                        27 65          0.12 3.300000e-01        0.00
## Urban                       28 65          0.18 3.900000e-01        0.00
## ForProfit                   29 65          0.54 5.000000e-01        1.00
## HC1                         30 65          0.12 3.300000e-01        0.00
## HC2                         31 65          0.35 4.800000e-01        0.00
## HC4                         32 65          0.06 2.400000e-01        0.00
## HC5                         33 65          0.05 2.100000e-01        0.00
## AR_by_OpIncome.y.1.         34 65       2256.05 2.450380e+03     1483.00
## FB_Plus_OpInc_ByFB.y.1.     35 65          1.24 2.320000e+00        1.08
## PercentMedicaidDays.y.1.    36 65          0.10 1.100000e-01        0.06
## PercentMedicareDays.y.1.    37 65          0.32 1.300000e-01        0.30
## CurrentRatio.y.1.           38 65         -4.41 2.859000e+01        0.76
## Debt2Equity.y.1.            39 65          0.61 5.370000e+00        0.13
## DaysSalesOutstanding.y.1.   40 65         56.60 4.449000e+01       53.68
## LaborCompRatio.y.1.         41 65          0.50 1.700000e-01        0.49
## OpProfitMargin.y.1.         42 65         -0.12 2.400000e-01       -0.12
## DaysCashOnHand.y.1.         43 65         15.94 2.670000e+01        3.54
## BedUtil.y.1.                44 65          0.37 2.100000e-01        0.30
## AdjPxDays.y.1.              45 65      38301.12 2.809168e+04    31065.45
## Alt1Ohls3.y.1.              46 65         -0.08 1.280000e+00        0.14
## AltmanX2.y.1.               47 65         -0.05 1.000000e+00       -0.06
## AltmanX3.y.1.               48 65         -0.14 7.600000e-01       -0.06
## AltmanX4.y.1.               49 65 -583533633.78 4.207232e+09       -0.08
## OhlsonX1.y.1.               50 65         10.90 1.070000e+00       10.94
## OhlsonX2.y.1.               51 65          0.99 2.160000e+00        0.73
## OhlsonX4.y.1.               52 65          0.94 1.830000e+00        0.69
## OhlsonX6.y.1.               53 65         -0.15 9.400000e-01       -0.04
## OhlsonX7.y.1.               54 65  226846964.61 7.127845e+08       -0.08
## OhlsonX9.y.1.               55 65   -8899893.72 4.791898e+07 -2329416.00
## OhlsonX5.y.1.               56 65          0.37 4.900000e-01        0.00
## OhlsonX8.y.1.               57 65          0.62 4.900000e-01        1.00
## HC4_5.y.1.                  58 65          0.11 3.100000e-01        0.00
## AR_by_OpIncome.y.2.         59 65       2374.72 2.471240e+03     1539.00
## FB_Plus_OpInc_ByFB.y.2.     60 65         -1.16 1.212000e+01        0.97
## PercentMedicaidDays.y.2.    61 65          0.10 1.100000e-01        0.06
## PercentMedicareDays.y.2.    62 65          0.32 1.300000e-01        0.30
## CurrentRatio.y.2.           63 65          1.39 2.350000e+00        1.02
## Debt2Equity.y.2.            64 65          4.57 2.157000e+01        0.32
## DaysSalesOutstanding.y.2.   65 65         59.75 2.838000e+01       56.64
## LaborCompRatio.y.2.         66 65          0.49 1.800000e-01        0.45
## OpProfitMargin.y.2.         67 65         -0.11 2.400000e-01       -0.07
## DaysCashOnHand.y.2.         68 65         16.45 2.851000e+01        1.88
## BedUtil.y.2.                69 65          0.37 1.900000e-01        0.31
## AdjPxDays.y.2.              70 65      39824.46 3.183895e+04    33256.36
## Alt1Ohls3.y.2.              71 65 -106196329.22 8.561822e+08        0.08
## AltmanX2.y.2.               72 65  -25202102.98 2.031859e+08        0.00
## AltmanX3.y.2.               73 65  -53302465.59 4.297382e+08       -0.01
## AltmanX4.y.2.               74 65  -79713233.46 1.969878e+09        0.00
## OhlsonX1.y.2.               75 65         10.63 2.930000e+00       11.06
## OhlsonX2.y.2.               76 65  103653600.78 8.356820e+08        0.74
## OhlsonX4.y.2.               77 65         26.27 2.078800e+02        0.70
## OhlsonX6.y.2.               78 65  -41553303.11 3.350134e+08        0.00
## OhlsonX7.y.2.               79 65  248481606.05 8.655635e+08       -0.03
## OhlsonX9.y.2.               80 65   -1616473.57 4.254487e+07   131891.00
## OhlsonX5.y.2.               81 65          0.34 4.800000e-01        0.00
## OhlsonX8.y.2.               82 65          0.46 5.000000e-01        0.00
## D_AR_by_OpIncome            83 65          4.13 1.063000e+01        0.01
## D_FB_Plus_OpInc_ByFB        84 65          8.18 7.766000e+01       -0.14
## D_CurrentRatio              85 65         -0.15 9.800000e-01       -0.23
## D_Debt2Equity               86 65         -9.02 9.493000e+01        0.00
## D_LiabFundBalRatio          87 65        -11.86 9.608000e+01       -0.07
## D_DaysSalesOutstanding      88 65          0.40 2.570000e+00       -0.03
## D_LaborCompRatio            89 65          0.11 6.600000e-01        0.00
## D_OpProfitMargin            90 65          0.01 2.060000e+00       -0.12
## D_DaysCashOnHand            91 65         39.19 2.501300e+02       -0.11
## D_BedUtil                   92 65          0.04 5.200000e-01       -0.04
## D_AdjPxDays                 93 65          0.00 2.300000e-01       -0.01
## D_Alt1Ohls3                 94 65          0.17 2.430000e+00        0.12
## D_AltmanX2                  95 65         -0.62 4.190000e+00       -0.49
## D_AltmanX3                  96 65         -0.76 3.240000e+00       -0.29
## D_AltmanX4                  97 65   41082093.47 2.931489e+08       -0.62
## D_OhlsonX1                  98 65          0.00 4.000000e-02        0.00
## D_OhlsonX2                  99 65          0.62 3.000000e+00        0.12
## D_OhlsonX4                 100 65          1.64 6.190000e+00        0.23
## D_OhlsonX6                 101 65         -0.58 3.010000e+00       -0.38
## D_OhlsonX7                 102 65   37339779.42 2.676257e+08       -0.30
## D_OhlsonX9                 103 65         -0.95 4.930000e+00       -0.58
##                               trimmed        mad           min          max
## Bankrupt                         1.00       0.00  1.000000e+00 1.000000e+00
## Year                          2015.92       2.96  2.008000e+03 2.020000e+03
## AR_by_OpIncome                2057.57    2097.88  1.700000e+01 8.529000e+03
## FB_Plus_OpInc_ByFB               1.16       0.49 -1.250000e+00 6.986900e+02
## PercentMedicaidDays              0.08       0.06  1.000000e-02 4.500000e-01
## PercentMedicareDays              0.32       0.10  6.000000e-02 7.800000e-01
## CurrentRatio                     0.69       0.84 -1.310000e+01 3.920000e+00
## Debt2Equity                     -0.16       0.76 -1.922500e+03 7.330000e+00
## DaysSalesOutstanding            55.04      20.84 -2.131200e+02 2.356500e+02
## LaborCompRatio                   0.49       0.18  2.100000e-01 6.340000e+00
## OpProfitMargin                  -0.10       0.15 -1.046000e+01 3.700000e-01
## DaysCashOnHand                   8.06      10.78 -1.477000e+01 9.730000e+01
## BedUtil                          0.34       0.13  4.000000e-02 7.700000e-01
## AdjPxDays                    33600.95   25859.38  9.397100e+02 1.223322e+05
## Alt1Ohls3                        0.01       0.46 -2.400000e+00 3.070000e+00
## AltmanX2                        -0.04       0.16 -1.930000e+00 1.940000e+00
## AltmanX3                        -0.05       0.19 -1.390000e+00 9.600000e-01
## AltmanX4                  39316845.34       0.21 -2.022990e+07 3.386537e+09
## OhlsonX1                        10.92       1.07  8.450000e+00 1.265000e+01
## OhlsonX2                         0.77       0.71 -3.700000e+00 3.410000e+00
## OhlsonX4                         0.97       1.33 -4.900000e+00 1.187000e+01
## OhlsonX6                        -0.04       0.13 -1.470000e+00 7.200000e-01
## OhlsonX7                  58227343.37       0.21 -1.050000e+00 3.773668e+09
## OhlsonX9                  -1683258.72 6408557.77 -4.623097e+07 8.574380e+07
## OhlsonX5                         0.36       0.00  0.000000e+00 1.000000e+00
## OhlsonX8                         0.72       0.00  0.000000e+00 1.000000e+00
## Govt                             0.04       0.00  0.000000e+00 1.000000e+00
## Urban                            0.11       0.00  0.000000e+00 1.000000e+00
## ForProfit                        0.55       0.00  0.000000e+00 1.000000e+00
## HC1                              0.04       0.00  0.000000e+00 1.000000e+00
## HC2                              0.32       0.00  0.000000e+00 1.000000e+00
## HC4                              0.00       0.00  0.000000e+00 1.000000e+00
## HC5                              0.00       0.00  0.000000e+00 1.000000e+00
## AR_by_OpIncome.y.1.           1911.87    2083.05  4.000000e+00 8.594000e+03
## FB_Plus_OpInc_ByFB.y.1.          0.96       0.44 -2.090000e+00 1.683000e+01
## PercentMedicaidDays.y.1.         0.08       0.06  1.000000e-02 4.500000e-01
## PercentMedicareDays.y.1.         0.32       0.10  6.000000e-02 7.800000e-01
## CurrentRatio.y.1.                0.86       1.02 -1.879700e+02 1.232000e+01
## Debt2Equity.y.1.                 0.26       0.98 -2.106000e+01 2.458000e+01
## DaysSalesOutstanding.y.1.       57.78      18.31 -1.959100e+02 1.652700e+02
## LaborCompRatio.y.1.              0.49       0.21  2.100000e-01 1.040000e+00
## OpProfitMargin.y.1.             -0.10       0.13 -1.010000e+00 3.600000e-01
## DaysCashOnHand.y.1.             11.07      11.34 -8.980000e+00 1.056400e+02
## BedUtil.y.1.                     0.35       0.19  7.000000e-02 9.100000e-01
## AdjPxDays.y.1.               35687.51   28108.84  1.178840e+03 1.240885e+05
## Alt1Ohls3.y.1.                   0.04       0.34 -9.490000e+00 1.360000e+00
## AltmanX2.y.1.                   -0.06       0.15 -4.500000e+00 3.720000e+00
## AltmanX3.y.1.                   -0.06       0.24 -5.750000e+00 7.000000e-01
## AltmanX4.y.1.              4579764.31       0.16 -2.914540e+10 5.545628e+09
## OhlsonX1.y.1.                   10.97       1.02  7.770000e+00 1.277000e+01
## OhlsonX2.y.1.                    0.74       0.64 -1.600000e+00 1.668000e+01
## OhlsonX4.y.1.                    0.86       0.92 -5.460000e+00 6.630000e+00
## OhlsonX6.y.1.                   -0.05       0.16 -7.390000e+00 6.300000e-01
## OhlsonX7.y.1.             30863335.94       0.25 -4.748313e+08 3.380771e+09
## OhlsonX9.y.1.             -3811671.87 6454586.57 -2.914540e+08 8.103354e+07
## OhlsonX5.y.1.                    0.34       0.00  0.000000e+00 1.000000e+00
## OhlsonX8.y.1.                    0.64       0.00  0.000000e+00 1.000000e+00
## HC4_5.y.1.                       0.02       0.00  0.000000e+00 1.000000e+00
## AR_by_OpIncome.y.2.           2015.87    2121.60  2.000000e+01 8.565000e+03
## FB_Plus_OpInc_ByFB.y.2.          0.95       0.36 -7.298000e+01 3.090000e+00
## PercentMedicaidDays.y.2.         0.08       0.06  1.000000e-02 4.500000e-01
## PercentMedicareDays.y.2.         0.32       0.10  6.000000e-02 7.800000e-01
## CurrentRatio.y.2.                1.25       1.13 -8.260000e+00 1.070000e+01
## Debt2Equity.y.2.                 0.52       0.74 -5.230000e+00 1.558300e+02
## DaysSalesOutstanding.y.2.       57.28      19.36 -1.972000e+01 1.743900e+02
## LaborCompRatio.y.2.              0.48       0.19  7.000000e-02 9.900000e-01
## OpProfitMargin.y.2.             -0.09       0.12 -1.140000e+00 3.800000e-01
## DaysCashOnHand.y.2.             11.06       9.98 -7.850000e+00 1.110700e+02
## BedUtil.y.2.                     0.35       0.16  7.000000e-02 9.300000e-01
## AdjPxDays.y.2.               35981.70   28075.33  1.344470e+03 1.718853e+05
## Alt1Ohls3.y.2.                   0.02       0.24 -6.902761e+09 4.530000e+00
## AltmanX2.y.2.                   -0.03       0.22 -1.638137e+09 7.170000e+00
## AltmanX3.y.2.                   -0.05       0.16 -3.464660e+09 6.400000e-01
## AltmanX4.y.2.                    0.95       0.19 -9.627826e+09 4.860965e+09
## OhlsonX1.y.2.                   11.00       1.13 -1.115000e+01 1.277000e+01
## OhlsonX2.y.2.                    0.79       0.58 -4.200000e+00 6.737484e+09
## OhlsonX4.y.2.                    0.94       0.71 -3.233000e+01 1.675990e+03
## OhlsonX6.y.2.                   -0.02       0.13 -2.700965e+09 6.400000e-01
## OhlsonX7.y.2.             14021543.38       0.21 -2.206207e+08 4.385387e+09
## OhlsonX9.y.2.              -874270.76 8117512.25 -1.457655e+08 1.671678e+08
## OhlsonX5.y.2.                    0.30       0.00  0.000000e+00 1.000000e+00
## OhlsonX8.y.2.                    0.45       0.00  0.000000e+00 1.000000e+00
## D_AR_by_OpIncome                 1.99       0.89 -9.900000e-01 7.190000e+01
## D_FB_Plus_OpInc_ByFB            -0.45       0.32 -3.378000e+01 6.228300e+02
## D_CurrentRatio                  -0.26       0.34 -3.500000e+00 3.300000e+00
## D_Debt2Equity                   -0.06       0.54 -7.519800e+02 1.195000e+02
## D_LiabFundBalRatio              -0.21       0.79 -7.742200e+02 1.800000e+01
## D_DaysSalesOutstanding          -0.02       0.19 -7.200000e-01 1.969000e+01
## D_LaborCompRatio                 0.01       0.10 -3.400000e-01 5.100000e+00
## D_OpProfitMargin                -0.05       0.77 -7.000000e+00 9.360000e+00
## D_DaysCashOnHand                 0.04       0.87 -1.558000e+01 1.936500e+03
## D_BedUtil                       -0.02       0.08 -5.900000e-01 3.860000e+00
## D_AdjPxDays                     -0.01       0.10 -8.100000e-01 1.150000e+00
## D_Alt1Ohls3                      0.11       0.80 -8.290000e+00 1.367000e+01
## D_AltmanX2                      -0.63       1.13 -1.864000e+01 1.700000e+01
## D_AltmanX3                      -0.44       0.82 -2.100000e+01 8.000000e+00
## D_AltmanX4                      -0.98       1.11 -4.214563e+07 2.338349e+09
## D_OhlsonX1                       0.00       0.01 -5.000000e-02 2.500000e-01
## D_OhlsonX2                       0.17       0.17 -3.330000e+00 2.200000e+01
## D_OhlsonX4                       0.41       0.52 -3.610000e+00 4.100000e+01
## D_OhlsonX6                      -0.32       1.00 -1.400000e+01 6.000000e+00
## D_OhlsonX7                      -0.47       0.75 -2.400000e+01 2.147964e+09
## D_OhlsonX9                      -0.85       1.12 -1.959000e+01 2.074000e+01
##                                  range  skew kurtosis           se        IQR
## Bankrupt                  0.000000e+00   NaN      NaN         0.00       0.00
## Year                      1.200000e+01 -0.86    -0.57         0.40       4.00
## AR_by_OpIncome            8.512000e+03  0.97     0.06       295.60    3181.00
## FB_Plus_OpInc_ByFB        6.999400e+02  7.69    58.03        10.73       0.48
## PercentMedicaidDays       4.400000e-01  1.69     2.40         0.01       0.11
## PercentMedicareDays       7.200000e-01  0.81     0.86         0.02       0.15
## CurrentRatio              1.702000e+01 -3.29    14.09         0.31       1.19
## Debt2Equity               1.929830e+03 -7.68    57.97        29.57       1.20
## DaysSalesOutstanding      4.487700e+02 -1.55    13.49         6.19      28.87
## LaborCompRatio            6.130000e+00  7.17    52.68         0.09       0.23
## OpProfitMargin            1.083000e+01 -7.42    55.23         0.16       0.20
## DaysCashOnHand            1.120700e+02  1.81     3.12         2.77      20.81
## BedUtil                   7.300000e-01  0.60    -0.53         0.02       0.27
## AdjPxDays                 1.213925e+05  0.94     0.64      3216.15   34658.06
## Alt1Ohls3                 5.470000e+00  0.81     3.56         0.10       0.66
## AltmanX2                  3.870000e+00  0.11    10.02         0.05       0.22
## AltmanX3                  2.350000e+00 -0.90     5.01         0.04       0.26
## AltmanX4                  3.406767e+09  3.26     9.70  91374207.59       0.36
## OhlsonX1                  4.200000e+00 -0.26    -0.60         0.12       1.39
## OhlsonX2                  7.110000e+00 -0.40     2.11         0.15       0.89
## OhlsonX4                  1.677000e+01  1.29     7.70         0.28       1.60
## OhlsonX6                  2.190000e+00 -1.80     9.18         0.04       0.16
## OhlsonX7                  3.773668e+09  3.09     8.64 101711015.76       0.44
## OhlsonX9                  1.319748e+08  1.55     8.48   2168436.94 8636372.00
## OhlsonX5                  1.000000e+00  0.46    -1.81         0.06       1.00
## OhlsonX8                  1.000000e+00 -0.74    -1.48         0.06       1.00
## Govt                      1.000000e+00  2.24     3.07         0.04       0.00
## Urban                     1.000000e+00  1.59     0.53         0.05       0.00
## ForProfit                 1.000000e+00 -0.15    -2.01         0.06       1.00
## HC1                       1.000000e+00  2.24     3.07         0.04       0.00
## HC2                       1.000000e+00  0.60    -1.67         0.06       1.00
## HC4                       1.000000e+00  3.56    10.88         0.03       0.00
## HC5                       1.000000e+00  4.23    16.11         0.03       0.00
## AR_by_OpIncome.y.1.       8.590000e+03  0.92    -0.21       303.93    4302.00
## FB_Plus_OpInc_ByFB.y.1.   1.892000e+01  4.84    29.30         0.29       0.65
## PercentMedicaidDays.y.1.  4.400000e-01  1.69     2.40         0.01       0.11
## PercentMedicareDays.y.1.  7.200000e-01  0.81     0.86         0.02       0.15
## CurrentRatio.y.1.         2.002900e+02 -5.42    29.18         3.55       1.42
## Debt2Equity.y.1.          4.564000e+01  0.67     8.77         0.67       1.11
## DaysSalesOutstanding.y.1. 3.611800e+02 -2.46    14.51         5.52      26.88
## LaborCompRatio.y.1.       8.300000e-01  0.58    -0.04         0.02       0.29
## OpProfitMargin.y.1.       1.370000e+00 -1.20     3.67         0.03       0.19
## DaysCashOnHand.y.1.       1.146200e+02  1.68     2.08         3.31      19.94
## BedUtil.y.1.              8.400000e-01  0.73    -0.29         0.03       0.28
## AdjPxDays.y.1.            1.229097e+05  0.81    -0.03      3484.34   39635.48
## Alt1Ohls3.y.1.            1.085000e+01 -6.01    41.67         0.16       0.47
## AltmanX2.y.1.             8.220000e+00 -0.60     9.08         0.12       0.20
## AltmanX3.y.1.             6.450000e+00 -6.13    42.69         0.09       0.30
## AltmanX4.y.1.             3.469103e+10 -5.52    32.55 521842926.38       0.21
## OhlsonX1.y.1.             5.000000e+00 -0.59     0.06         0.13       1.46
## OhlsonX2.y.1.             1.828000e+01  5.87    40.04         0.27       0.84
## OhlsonX4.y.1.             1.209000e+01  0.22     2.94         0.23       1.26
## OhlsonX6.y.1.             8.020000e+00 -7.12    52.39         0.12       0.20
## OhlsonX7.y.1.             3.855602e+09  3.12     9.02  88410034.93       0.35
## OhlsonX9.y.1.             3.724876e+08 -3.53    17.86   5943617.45 8590542.00
## OhlsonX5.y.1.             1.000000e+00  0.53    -1.75         0.06       1.00
## OhlsonX8.y.1.             1.000000e+00 -0.46    -1.81         0.06       1.00
## HC4_5.y.1.                1.000000e+00  2.47     4.18         0.04       0.00
## AR_by_OpIncome.y.2.       8.545000e+03  0.94    -0.07       306.52    4180.00
## FB_Plus_OpInc_ByFB.y.2.   7.607000e+01 -5.33    27.01         1.50       0.46
## PercentMedicaidDays.y.2.  4.400000e-01  1.69     2.40         0.01       0.11
## PercentMedicareDays.y.2.  7.200000e-01  0.81     0.86         0.02       0.15
## CurrentRatio.y.2.         1.896000e+01  0.30     6.41         0.29       1.61
## Debt2Equity.y.2.          1.610600e+02  5.83    35.85         2.68       1.10
## DaysSalesOutstanding.y.2. 1.941100e+02  1.15     3.95         3.52      25.31
## LaborCompRatio.y.2.       9.200000e-01  0.40    -0.42         0.02       0.27
## OpProfitMargin.y.2.       1.520000e+00 -1.23     3.96         0.03       0.19
## DaysCashOnHand.y.2.       1.189200e+02  1.64     1.81         3.54      25.67
## BedUtil.y.2.              8.600000e-01  0.73    -0.05         0.02       0.26
## AdjPxDays.y.2.            1.705408e+05  1.45     3.06      3949.14   42835.17
## Alt1Ohls3.y.2.            6.902761e+09 -7.69    58.09 106196329.23       0.31
## AltmanX2.y.2.             1.638137e+09 -7.69    58.09  25202103.08       0.27
## AltmanX3.y.2.             3.464660e+09 -7.69    58.09  53302465.51       0.23
## AltmanX4.y.2.             1.448879e+10 -2.32    10.97 244333317.81       0.26
## OhlsonX1.y.2.             2.392000e+01 -6.30    44.12         0.36       1.38
## OhlsonX2.y.2.             6.737484e+09  7.69    58.09 103653599.99       0.76
## OhlsonX4.y.2.             1.708320e+03  7.69    58.02        25.78       0.95
## OhlsonX6.y.2.             2.700965e+09 -7.69    58.09  41553303.05       0.19
## OhlsonX7.y.2.             4.606007e+09  3.68    13.14 107359932.85       0.33
## OhlsonX9.y.2.             3.129332e+08  0.17     4.61   5277041.47 9791674.00
## OhlsonX5.y.2.             1.000000e+00  0.67    -1.58         0.06       1.00
## OhlsonX8.y.2.             1.000000e+00  0.15    -2.01         0.06       1.00
## D_AR_by_OpIncome          7.289000e+01  4.25    22.86         1.32       3.01
## D_FB_Plus_OpInc_ByFB      6.566100e+02  7.62    57.36         9.63       0.59
## D_CurrentRatio            6.800000e+00  1.15     5.32         0.12       0.45
## D_Debt2Equity             8.714800e+02 -7.33    54.78        11.77       0.70
## D_LiabFundBalRatio        7.922200e+02 -7.68    57.99        11.92       1.04
## D_DaysSalesOutstanding    2.042000e+01  6.63    46.04         0.32       0.27
## D_LaborCompRatio          5.440000e+00  6.71    47.37         0.08       0.13
## D_OpProfitMargin          1.636000e+01  0.91     7.13         0.26       1.05
## D_DaysCashOnHand          1.952080e+03  6.88    48.31        31.02       1.23
## D_BedUtil                 4.450000e+00  6.07    41.90         0.06       0.13
## D_AdjPxDays               1.970000e+00  1.34     9.37         0.03       0.12
## D_Alt1Ohls3               2.195000e+01  1.96    14.98         0.30       1.07
## D_AltmanX2                3.564000e+01 -0.02     8.15         0.52       1.63
## D_AltmanX3                2.900000e+01 -3.51    21.87         0.40       1.16
## D_AltmanX4                2.380494e+09  7.42    55.05  36360650.47       1.56
## D_OhlsonX1                3.000000e-01  5.42    35.36         0.00       0.01
## D_OhlsonX2                2.533000e+01  5.73    37.30         0.37       0.23
## D_OhlsonX4                4.461000e+01  4.93    25.92         0.77       0.68
## D_OhlsonX6                2.000000e+01 -1.62     5.88         0.37       1.30
## D_OhlsonX7                2.147964e+09  7.55    56.52  33194880.97       1.12
## D_OhlsonX9                4.032000e+01  0.30     8.32         0.61       1.64
##                                 Q0.25      Q0.75
## Bankrupt                         1.00       1.00
## Year                          2014.00    2018.00
## AR_by_OpIncome                 158.00    3339.00
## FB_Plus_OpInc_ByFB               0.78       1.26
## PercentMedicaidDays              0.03       0.14
## PercentMedicareDays              0.24       0.39
## CurrentRatio                     0.23       1.42
## Debt2Equity                     -0.80       0.40
## DaysSalesOutstanding            41.44      70.31
## LaborCompRatio                   0.36       0.59
## OpProfitMargin                  -0.21      -0.01
## DaysCashOnHand                  -1.52      19.29
## BedUtil                          0.23       0.50
## AdjPxDays                    15671.19   50329.25
## Alt1Ohls3                       -0.32       0.34
## AltmanX2                        -0.16       0.06
## AltmanX3                        -0.18       0.08
## AltmanX4                        -0.17       0.19
## OhlsonX1                        10.26      11.65
## OhlsonX2                         0.23       1.12
## OhlsonX4                         0.34       1.94
## OhlsonX6                        -0.13       0.03
## OhlsonX7                        -0.17       0.27
## OhlsonX9                  -6436159.00 2200213.00
## OhlsonX5                         0.00       1.00
## OhlsonX8                         0.00       1.00
## Govt                             0.00       0.00
## Urban                            0.00       0.00
## ForProfit                        0.00       1.00
## HC1                              0.00       0.00
## HC2                              0.00       1.00
## HC4                              0.00       0.00
## HC5                              0.00       0.00
## AR_by_OpIncome.y.1.            136.00    4438.00
## FB_Plus_OpInc_ByFB.y.1.          0.66       1.31
## PercentMedicaidDays.y.1.         0.03       0.14
## PercentMedicareDays.y.1.         0.24       0.39
## CurrentRatio.y.1.                0.21       1.63
## Debt2Equity.y.1.                -0.55       0.56
## DaysSalesOutstanding.y.1.       43.92      70.80
## LaborCompRatio.y.1.              0.34       0.63
## OpProfitMargin.y.1.             -0.19       0.00
## DaysCashOnHand.y.1.             -1.32      18.62
## BedUtil.y.1.                     0.23       0.51
## AdjPxDays.y.1.               15847.45   55482.93
## Alt1Ohls3.y.1.                  -0.20       0.27
## AltmanX2.y.1.                   -0.17       0.03
## AltmanX3.y.1.                   -0.22       0.08
## AltmanX4.y.1.                   -0.18       0.03
## OhlsonX1.y.1.                   10.28      11.74
## OhlsonX2.y.1.                    0.21       1.05
## OhlsonX4.y.1.                    0.28       1.54
## OhlsonX6.y.1.                   -0.17       0.03
## OhlsonX7.y.1.                   -0.20       0.15
## OhlsonX9.y.1.             -6566399.00 2024143.00
## OhlsonX5.y.1.                    0.00       1.00
## OhlsonX8.y.1.                    0.00       1.00
## HC4_5.y.1.                       0.00       0.00
## AR_by_OpIncome.y.2.            135.00    4315.00
## FB_Plus_OpInc_ByFB.y.2.          0.73       1.19
## PercentMedicaidDays.y.2.         0.03       0.14
## PercentMedicareDays.y.2.         0.24       0.39
## CurrentRatio.y.2.                0.27       1.88
## Debt2Equity.y.2.                 0.00       1.10
## DaysSalesOutstanding.y.2.       45.13      70.44
## LaborCompRatio.y.2.              0.34       0.61
## OpProfitMargin.y.2.             -0.18       0.01
## DaysCashOnHand.y.2.             -0.91      24.76
## BedUtil.y.2.                     0.24       0.50
## AdjPxDays.y.2.               15414.78   58249.95
## Alt1Ohls3.y.2.                  -0.08       0.23
## AltmanX2.y.2.                   -0.15       0.12
## AltmanX3.y.2.                   -0.16       0.07
## AltmanX4.y.2.                   -0.13       0.13
## OhlsonX1.y.2.                   10.28      11.66
## OhlsonX2.y.2.                    0.37       1.13
## OhlsonX4.y.2.                    0.32       1.27
## OhlsonX6.y.2.                   -0.13       0.06
## OhlsonX7.y.2.                   -0.24       0.09
## OhlsonX9.y.2.             -5343296.00 4448378.00
## OhlsonX5.y.2.                    0.00       1.00
## OhlsonX8.y.2.                    0.00       1.00
## D_AR_by_OpIncome                -0.32       2.69
## D_FB_Plus_OpInc_ByFB            -0.62      -0.02
## D_CurrentRatio                  -0.45       0.00
## D_Debt2Equity                   -0.36       0.33
## D_LiabFundBalRatio              -0.70       0.34
## D_DaysSalesOutstanding          -0.16       0.10
## D_LaborCompRatio                -0.06       0.06
## D_OpProfitMargin                -0.64       0.42
## D_DaysCashOnHand                -0.68       0.55
## D_BedUtil                       -0.09       0.04
## D_AdjPxDays                     -0.07       0.06
## D_Alt1Ohls3                     -0.46       0.62
## D_AltmanX2                      -1.41       0.22
## D_AltmanX3                      -1.00       0.16
## D_AltmanX4                      -1.48       0.08
## D_OhlsonX1                      -0.01       0.00
## D_OhlsonX2                       0.00       0.23
## D_OhlsonX4                      -0.06       0.62
## D_OhlsonX6                      -1.00       0.30
## D_OhlsonX7                      -1.00       0.12
## D_OhlsonX9                      -1.52       0.12

Correlations

Altman -

4 factors/dependent variables.

\[ Altman \ Z'' \ Score = 6.56 \ A + 3.26 \ B + 6.72 \ C + 1.05 \ D \]

where -

  1. A = working capital/total assets,

  2. B = retained earnings/total assets,

  3. C = earnings before interest and taxes/total assets, and

  4. D = market value of equity/total liabilities.

Ohlson -

9 factors/dependent variables.

\[ T = -1.32 \ – \ 0.407 \ log \dfrac{TA_t }{GNP}+6.03 \dfrac{TL_t }{TA_t} – 1.43 \dfrac{WC_t}{TA_t} + 0.0757 \dfrac{CL_t}{CA_t } – 1.72 \ ZX – 2.37 \dfrac{NI_t}{TA_t} – 1.83 \dfrac{FFO_t}{TL_t} + 0.285 \ Y – 0.521 \dfrac{NI_t – Ni_{t-1}}{|NI_t|+|Ni_{t-1}|} \]

where -

  1. TA = total assets,

  2. GNP = Gross National Product price index level,

  3. TL = total liabilities,

  4. WC = working capital,

  5. CL= current liabilities,

  6. CA = current assets,

  7. ZX = 1 if TL exceeds TA, 0 otherwise;

  8. NI = net income,

  9. FFO = funds from operations, and

  10. Y = 1 if a net loss of the last two years, 0 otherwise

Q AS - choice of lag2 variables???

altohls = bankrupt[,46:57]     #@y-1 ; manually checked.  
  names(altohls)
##  [1] "Alt1Ohls3.y.1." "AltmanX2.y.1."  "AltmanX3.y.1."  "AltmanX4.y.1." 
##  [5] "OhlsonX1.y.1."  "OhlsonX2.y.1."  "OhlsonX4.y.1."  "OhlsonX6.y.1." 
##  [9] "OhlsonX7.y.1."  "OhlsonX9.y.1."  "OhlsonX5.y.1."  "OhlsonX8.y.1."
lag2    = bankrupt[, c(34:45)] #@y-1 ; lag 1
  names(lag2)
##  [1] "AR_by_OpIncome.y.1."       "FB_Plus_OpInc_ByFB.y.1."  
##  [3] "PercentMedicaidDays.y.1."  "PercentMedicareDays.y.1." 
##  [5] "CurrentRatio.y.1."         "Debt2Equity.y.1."         
##  [7] "DaysSalesOutstanding.y.1." "LaborCompRatio.y.1."      
##  [9] "OpProfitMargin.y.1."       "DaysCashOnHand.y.1."      
## [11] "BedUtil.y.1."              "AdjPxDays.y.1."
corfunction(altohls)

corfunction(lag2)

DV Table

table(bankrupt$Bankrupt)
## 
##    0    1 
## 3026   65

Distributions / Box Cox

  • Note: We deliberately did not use transformations to support practitioner use. We did investigate the optimal Box-Cox transformations, however. *
temp = bankrupt[, 1:ncol(bankrupt)]

?try # try is a wrapper to run an expression that might fail and allow the user's code to handle error-recovery.

for (i in 1:ncol(temp)){
  par(mfrow=c(1,2))
  hist(temp[,i], main=colnames(temp)[i], breaks=20)
  tmp = temp[,i] + abs(min(temp[,i]))+.01

  try(hist(x        = tmp^powerTransform(tmp)$lambda,
           main     = paste0(colnames(temp)[i],
                         "^" ,
                         powerTransform(tmp)$lambda
                        ),  
           breaks   = 20
           ), silent=TRUE
      )
}

Training / Validation Sets

We use a stratified split of the original data to be sure sufficient observations of bankrupt were in each group.

set.seed(1234)

brpt  <- as.numeric(rownames(bankrupt[bankrupt$Bankrupt==1,])) # bankruptcy cases
nbrpt <- as.numeric(rownames(bankrupt[bankrupt$Bankrupt==0,])) # non-bankruptcy cases

mys1 <- sample(x = brpt,  size = .5 * length(brpt)  ) # bankruptcy sample observations
mys2 <- sample(x = nbrpt, size = .5 * length(nbrpt) ) # non-bankruptcy sample observations
mys  <- c(mys1,mys2) #conjoined
           
test  <- bankrupt[-mys,] # filtering test set  (index on rows)
train <- bankrupt[mys,]  # filtering train set (index on rows)

table(train$Bankrupt)
## 
##    0    1 
## 1513   32
table(test$Bankrupt)
## 
##    0    1 
## 1513   33
write.csv(x = train, 
          file = '/Users/arvindsharma/Library/CloudStorage/GoogleDrive-sharmaar@bc.edu/My Drive/hospital_bankrutcy/clean_data/interim.csv', 
          row.names=FALSE) # write csv

Scale-Not Done for Interpretability

  • We are deliberately NOT scaling the data to support practical use. The code that might have been used follows.*
mymeans = colMeans(train) #use the means and sds from the training set to apply to the test set 

mysd = sapply(train, sd) #doing so avoids leakage

for (i in 1:ncol(train)){ 
  if(i>10){ train[,i]=(train[,i]-mymeans[i])/mysd[i] 
             test[,i]=(test[,i]-mymeans[i])/mysd[i]
          } 
  
}

Rebalance Training Set

The data are highly imbalanced. We generate observations to learn about bankruptcy.

train=read.csv('/Users/arvindsharma/Library/CloudStorage/GoogleDrive-sharmaar@bc.edu/My Drive/hospital_bankrutcy/clean_data/interim.csv') # read csv
tmp1=mwmote(train, numInstances = table(train$Bankrupt)[1]-table(train$Bankrupt)[2], classAttr = "Bankrupt") #noisy oversample
train=rbind(train,tmp1)
table(train$Bankrupt)
## 
##    0    1 
## 1513 1513

Describe Rebalanced Set

describe(train, IQR=TRUE, quant=c(.25,.75))
##                           vars    n         mean           sd      median
## Bankrupt                     1 3026         0.50 5.000000e-01        0.50
## Year                         2 3026      2014.06 3.860000e+00     2014.00
## AR_by_OpIncome               3 3026      2645.87 2.378030e+03     1738.50
## FB_Plus_OpInc_ByFB           4 3026         0.96 4.160000e+00        0.93
## PercentMedicaidDays          5 3026         0.08 8.000000e-02        0.06
## PercentMedicareDays          6 3026         0.33 1.000000e-01        0.32
## CurrentRatio                 7 3026         4.03 1.291200e+02        1.21
## Debt2Equity                  8 3026        -0.03 1.391000e+01        0.40
## DaysSalesOutstanding         9 3026        50.18 1.050000e+02       46.32
## LaborCompRatio              10 3026         0.54 5.000000e-01        0.45
## OpProfitMargin              11 3026        -0.21 8.700000e-01       -0.09
## DaysCashOnHand              12 3026        29.01 8.790000e+01        6.34
## BedUtil                     13 3026         0.42 1.800000e-01        0.39
## AdjPxDays                   14 3026     63085.10 7.754776e+04    40399.07
## Alt1Ohls3                   15 3026 -15543542.08 6.202158e+08        0.05
## AltmanX2                    16 3026 -14895313.37 5.466000e+08       -0.04
## AltmanX3                    17 3026  -4122257.49 1.402914e+08       -0.05
## AltmanX4                    18 3026 197327831.06 3.216694e+09       -0.04
## OhlsonX1                    19 3026        11.46 1.820000e+00       11.34
## OhlsonX2                    20 3026 -15587544.68 7.410010e+08        0.64
## OhlsonX4                    21 3026         1.22 3.150000e+00        0.83
## OhlsonX6                    22 3026  -4874910.22 2.245140e+08       -0.03
## OhlsonX7                    23 3026 182786059.51 1.379908e+09       -0.05
## OhlsonX9                    24 3026   6095168.59 9.199484e+07 -1960096.10
## OhlsonX5                    25 3026         0.26 4.400000e-01        0.00
## OhlsonX8                    26 3026         0.48 5.000000e-01        0.00
## Govt                        27 3026         0.08 2.700000e-01        0.00
## Urban                       28 3026         0.07 2.500000e-01        0.00
## ForProfit                   29 3026         0.28 4.500000e-01        0.00
## HC1                         30 3026         0.04 2.000000e-01        0.00
## HC2                         31 3026         0.17 3.800000e-01        0.00
## HC4                         32 3026         0.13 3.400000e-01        0.00
## HC5                         33 3026         0.06 2.400000e-01        0.00
## AR_by_OpIncome.y.1.         34 3026      2784.10 2.359250e+03     2369.50
## FB_Plus_OpInc_ByFB.y.1.     35 3026         1.48 2.833000e+01        0.91
## PercentMedicaidDays.y.1.    36 3026         0.08 8.000000e-02        0.06
## PercentMedicareDays.y.1.    37 3026         0.33 1.000000e-01        0.32
## CurrentRatio.y.1.           38 3026         1.95 3.123000e+01        1.43
## Debt2Equity.y.1.            39 3026         2.46 9.165000e+01        0.43
## DaysSalesOutstanding.y.1.   40 3026        53.47 9.349000e+01       51.18
## LaborCompRatio.y.1.         41 3026         0.48 1.400000e-01        0.45
## OpProfitMargin.y.1.         42 3026        -0.09 2.100000e-01       -0.08
## DaysCashOnHand.y.1.         43 3026        35.07 9.034000e+01       17.20
## BedUtil.y.1.                44 3026         0.43 1.800000e-01        0.41
## AdjPxDays.y.1.              45 3026     63508.54 7.579328e+04    41933.56
## Alt1Ohls3.y.1.              46 3026  -8386559.04 3.028840e+08        0.10
## AltmanX2.y.1.               47 3026  -1530142.22 4.786308e+07       -0.02
## AltmanX3.y.1.               48 3026   -968588.38 3.089794e+07       -0.02
## AltmanX4.y.1.               49 3026 142235873.97 1.180993e+09       -0.03
## OhlsonX1.y.1.               50 3026        11.49 1.610000e+00       11.40
## OhlsonX2.y.1.               51 3026   2249494.26 7.625428e+07        0.61
## OhlsonX4.y.1.               52 3026         0.74 4.390000e+00        0.65
## OhlsonX6.y.1.               53 3026  -1176686.93 3.925391e+07       -0.02
## OhlsonX7.y.1.               54 3026 175591740.13 1.293762e+09       -0.03
## OhlsonX9.y.1.               55 3026   4531056.53 1.171118e+08  -895417.45
## OhlsonX5.y.1.               56 3026         0.14 3.500000e-01        0.00
## OhlsonX8.y.1.               57 3026         0.48 5.000000e-01        0.00
## HC4_5.y.1.                  58 3026         0.19 3.900000e-01        0.00
## AR_by_OpIncome.y.2.         59 3026      2940.54 2.280150e+03     2367.00
## FB_Plus_OpInc_ByFB.y.2.     60 3026         0.78 7.390000e+00        0.98
## PercentMedicaidDays.y.2.    61 3026         0.08 8.000000e-02        0.06
## PercentMedicareDays.y.2.    62 3026         0.33 1.000000e-01        0.32
## CurrentRatio.y.2.           63 3026         3.83 8.063000e+01        1.74
## Debt2Equity.y.2.            64 3026        -0.80 7.776000e+01        0.45
## DaysSalesOutstanding.y.2.   65 3026        57.41 6.209000e+01       54.02
## LaborCompRatio.y.2.         66 3026         0.45 1.600000e-01        0.43
## OpProfitMargin.y.2.         67 3026        -0.06 2.900000e-01       -0.03
## DaysCashOnHand.y.2.         68 3026        31.97 8.266000e+01       11.60
## BedUtil.y.2.                69 3026         0.44 1.800000e-01        0.41
## AdjPxDays.y.2.              70 3026     64748.99 7.465293e+04    43629.06
## Alt1Ohls3.y.2.              71 3026 -12078412.97 3.539794e+08        0.12
## AltmanX2.y.2.               72 3026  -6427432.43 3.079368e+08        0.01
## AltmanX3.y.2.               73 3026  -1585108.07 5.318950e+07        0.03
## AltmanX4.y.2.               74 3026 127384872.75 1.335519e+09        0.02
## OhlsonX1.y.2.               75 3026        11.51 1.570000e+00       11.43
## OhlsonX2.y.2.               76 3026   2138422.97 7.209015e+07        0.59
## OhlsonX4.y.2.               77 3026         1.40 3.059000e+01        0.60
## OhlsonX6.y.2.               78 3026  -1988280.97 6.520815e+07        0.01
## OhlsonX7.y.2.               79 3026 170260803.88 1.282674e+09        0.05
## OhlsonX9.y.2.               80 3026   7750131.35 1.137214e+08   598180.30
## OhlsonX5.y.2.               81 3026         0.13 3.400000e-01        0.00
## OhlsonX8.y.2.               82 3026         0.19 4.000000e-01        0.00
## D_AR_by_OpIncome            83 3026         2.94 2.400000e+01        0.06
## D_FB_Plus_OpInc_ByFB        84 3026        -0.86 1.008000e+01       -0.16
## D_CurrentRatio              85 3026        -0.22 2.670000e+00       -0.15
## D_Debt2Equity               86 3026         2.10 1.377000e+01        0.05
## D_LiabFundBalRatio          87 3026         0.12 3.830000e+00        0.07
## D_DaysSalesOutstanding      88 3026         0.28 2.200000e+00       -0.04
## D_LaborCompRatio            89 3026         0.08 4.600000e-01        0.02
## D_OpProfitMargin            90 3026         0.10 3.520000e+00        0.06
## D_DaysCashOnHand            91 3026         9.33 3.259200e+02       -0.29
## D_BedUtil                   92 3026         0.04 4.000000e-01       -0.04
## D_AdjPxDays                 93 3026         0.01 1.000000e+00       -0.02
## D_Alt1Ohls3                 94 3026 -32262060.90 1.647339e+09       -0.12
## D_AltmanX2                  95 3026  30896776.78 1.383992e+09       -0.20
## D_AltmanX3                  96 3026  23726494.58 8.334888e+08       -0.37
## D_AltmanX4                  97 3026  86097188.33 8.776262e+09       -0.40
## D_OhlsonX1                  98 3026         0.00 1.100000e-01        0.00
## D_OhlsonX2                  99 3026  -2802094.36 1.083939e+09        0.07
## D_OhlsonX4                 100 3026         0.41 2.420000e+00        0.18
## D_OhlsonX6                 101 3026  23224066.24 1.021291e+09        0.00
## D_OhlsonX7                 102 3026  32401449.83 1.455388e+09       -0.40
## D_OhlsonX9                 103 3026    696391.84 3.830811e+07       -0.31
##                              trimmed        mad           min          max
## Bankrupt                        0.50       0.74  0.000000e+00 1.000000e+00
## Year                         2013.98       4.45  2.008000e+03 2.021000e+03
## AR_by_OpIncome               2360.08    2315.82  4.000000e+00 8.592000e+03
## FB_Plus_OpInc_ByFB              0.73       0.48 -3.383000e+01 1.861200e+02
## PercentMedicaidDays             0.07       0.04  0.000000e+00 8.300000e-01
## PercentMedicareDays             0.33       0.10  0.000000e+00 8.300000e-01
## CurrentRatio                    1.36       1.05 -7.011000e+01 7.098050e+03
## Debt2Equity                     0.77       0.99 -2.889400e+02 4.077900e+02
## DaysSalesOutstanding           47.15      13.65 -1.690840e+03 4.282780e+03
## LaborCompRatio                  0.47       0.12  5.000000e-02 6.340000e+00
## OpProfitMargin                 -0.10       0.15 -1.046000e+01 8.000000e-01
## DaysCashOnHand                 14.43      11.71 -7.541700e+02 1.623180e+03
## BedUtil                         0.41       0.19  1.000000e-02 1.000000e+00
## AdjPxDays                   47415.70   25559.12  2.800000e+02 1.258166e+06
## Alt1Ohls3                       0.02       0.25 -2.069512e+10 1.716643e+10
## AltmanX2                       -0.05       0.14 -2.401988e+10 2.003558e+09
## AltmanX3                       -0.06       0.19 -6.057755e+09 1.405591e+09
## AltmanX4                        0.00       0.23 -2.401988e+10 1.520000e+11
## OhlsonX1                       11.46       1.01 -1.115000e+01 1.724000e+01
## OhlsonX2                        0.68       0.42 -3.619138e+10 2.092522e+09
## OhlsonX4                        1.01       0.76 -7.198000e+01 8.697000e+01
## OhlsonX6                       -0.04       0.13 -1.187764e+10 2.003558e+09
## OhlsonX7                        0.00       0.27 -8.071422e+09 2.906021e+10
## OhlsonX9                  -204277.50 7067208.13 -1.177478e+09 2.986955e+09
## OhlsonX5                        0.20       0.00  0.000000e+00 1.000000e+00
## OhlsonX8                        0.48       0.00  0.000000e+00 1.000000e+00
## Govt                            0.00       0.00  0.000000e+00 1.000000e+00
## Urban                           0.00       0.00  0.000000e+00 1.000000e+00
## ForProfit                       0.22       0.00  0.000000e+00 1.000000e+00
## HC1                             0.00       0.00  0.000000e+00 1.000000e+00
## HC2                             0.09       0.00  0.000000e+00 1.000000e+00
## HC4                             0.04       0.00  0.000000e+00 1.000000e+00
## HC5                             0.00       0.00  0.000000e+00 1.000000e+00
## AR_by_OpIncome.y.1.          2544.22    3057.86  2.000000e+00 8.603000e+03
## FB_Plus_OpInc_ByFB.y.1.         0.86       0.31 -2.297900e+02 1.378650e+03
## PercentMedicaidDays.y.1.        0.07       0.04  0.000000e+00 8.300000e-01
## PercentMedicareDays.y.1.        0.33       0.10  0.000000e+00 8.300000e-01
## CurrentRatio.y.1.               1.57       1.07 -7.873100e+02 1.482250e+03
## Debt2Equity.y.1.                0.62       0.68 -6.275700e+02 4.467920e+03
## DaysSalesOutstanding.y.1.      52.26      15.27 -1.647780e+03 3.816810e+03
## LaborCompRatio.y.1.             0.47       0.13 -4.900000e-01 1.740000e+00
## OpProfitMargin.y.1.            -0.08       0.12 -2.510000e+00 3.420000e+00
## DaysCashOnHand.y.1.            21.57      22.86 -9.288000e+02 1.766670e+03
## BedUtil.y.1.                    0.43       0.18  2.000000e-02 1.000000e+00
## AdjPxDays.y.1.              48867.26   26154.64  1.360000e+02 1.415587e+06
## Alt1Ohls3.y.1.                  0.07       0.18 -1.393858e+10 3.015305e+08
## AltmanX2.y.1.                  -0.02       0.10 -1.789527e+09 2.097515e+08
## AltmanX3.y.1.                  -0.04       0.13 -1.542306e+09 4.040000e+00
## AltmanX4.y.1.                   0.00       0.15 -1.602656e+10 2.285539e+10
## OhlsonX1.y.1.                  11.50       0.92 -1.115000e+01 1.712000e+01
## OhlsonX2.y.1.                   0.63       0.36 -9.890000e+00 3.917888e+09
## OhlsonX4.y.1.                   0.74       0.46 -1.835000e+02 7.136000e+01
## OhlsonX6.y.1.                  -0.03       0.10 -1.789527e+09 2.097517e+08
## OhlsonX7.y.1.                  -0.02       0.25 -7.165679e+09 2.558153e+10
## OhlsonX9.y.1.              771123.70 5466598.27 -1.308272e+09 5.228494e+09
## OhlsonX5.y.1.                   0.05       0.00  0.000000e+00 1.000000e+00
## OhlsonX8.y.1.                   0.47       0.00  0.000000e+00 1.000000e+00
## HC4_5.y.1.                      0.12       0.00  0.000000e+00 1.000000e+00
## AR_by_OpIncome.y.2.          2726.84    2476.68  6.000000e+00 8.602000e+03
## FB_Plus_OpInc_ByFB.y.2.         0.97       0.19 -3.264500e+02 9.611000e+01
## PercentMedicaidDays.y.2.        0.07       0.04  0.000000e+00 8.300000e-01
## PercentMedicareDays.y.2.        0.33       0.10  0.000000e+00 8.300000e-01
## CurrentRatio.y.2.               1.86       1.14 -4.556000e+01 4.418520e+03
## Debt2Equity.y.2.                0.57       0.67 -3.255210e+03 4.554200e+02
## DaysSalesOutstanding.y.2.      54.43      14.64 -1.552950e+03 1.711020e+03
## LaborCompRatio.y.2.             0.45       0.12 -1.990000e+00 4.580000e+00
## OpProfitMargin.y.2.            -0.04       0.08 -9.570000e+00 8.190000e+00
## DaysCashOnHand.y.2.            19.60      17.12 -6.907700e+02 1.666270e+03
## BedUtil.y.2.                    0.43       0.19  1.000000e-02 1.000000e+00
## AdjPxDays.y.2.              50641.08   27043.04  1.370000e+02 1.372553e+06
## Alt1Ohls3.y.2.                  0.10       0.16 -1.303108e+10 1.649000e+08
## AltmanX2.y.2.                   0.01       0.09 -1.667130e+10 7.113183e+08
## AltmanX3.y.2.                   0.01       0.09 -2.153638e+09 1.099090e+08
## AltmanX4.y.2.                   0.10       0.15 -2.621151e+10 2.753928e+10
## OhlsonX1.y.2.                  11.51       0.89 -1.115000e+01 1.700000e+01
## OhlsonX2.y.2.                   0.62       0.34 -6.485320e+07 3.187338e+09
## OhlsonX4.y.2.                   0.70       0.40 -9.859000e+01 1.675990e+03
## OhlsonX6.y.2.                   0.01       0.07 -2.540136e+09 2.528300e+07
## OhlsonX7.y.2.                   0.05       0.18 -5.251815e+09 2.424540e+10
## OhlsonX9.y.2.             2047369.88 5907859.00 -4.858712e+08 5.228494e+09
## OhlsonX5.y.2.                   0.04       0.00  0.000000e+00 1.000000e+00
## OhlsonX8.y.2.                   0.12       0.00  0.000000e+00 1.000000e+00
## D_AR_by_OpIncome                0.98       0.87 -1.000000e+00 1.245000e+03
## D_FB_Plus_OpInc_ByFB           -0.67       0.49 -1.540000e+02 4.370000e+02
## D_CurrentRatio                 -0.16       0.34 -1.220000e+02 1.788000e+01
## D_Debt2Equity                   0.25       0.51 -3.392200e+02 1.285000e+02
## D_LiabFundBalRatio              0.14       0.50 -1.409300e+02 1.197100e+02
## D_DaysSalesOutstanding         -0.04       0.20 -2.506000e+01 5.150000e+01
## D_LaborCompRatio                0.02       0.08 -5.670000e+00 5.100000e+00
## D_OpProfitMargin                0.17       0.93 -1.010000e+02 7.800000e+01
## D_DaysCashOnHand               -0.26       0.73 -6.450000e+02 1.694500e+04
## D_BedUtil                      -0.03       0.11 -5.700000e-01 3.860000e+00
## D_AdjPxDays                    -0.01       0.07 -8.100000e-01 5.420000e+01
## D_Alt1Ohls3                    -0.23       0.73 -8.997879e+10 3.052270e+09
## D_AltmanX2                      0.04       1.95 -1.708382e+08 7.506213e+10
## D_AltmanX3                     -1.81       1.14 -1.539000e+03 3.406117e+10
## D_AltmanX4                     -0.34       1.77 -1.460000e+11 4.500000e+11
## D_OhlsonX1                      0.00       0.01 -2.310000e+00 1.310000e+00
## D_OhlsonX2                      0.07       0.17 -5.097377e+10 2.615652e+10
## D_OhlsonX4                      0.30       0.48 -3.152000e+01 1.050000e+02
## D_OhlsonX6                      0.25       1.48 -8.772930e+03 5.543998e+10
## D_OhlsonX7                     -2.08       1.19 -5.342444e+10 4.296701e+10
## D_OhlsonX9                     -0.25       1.86 -2.101581e+04 2.107294e+09
##                                  range   skew kurtosis           se         IQR
## Bankrupt                  1.000000e+00   0.00    -2.00         0.01        1.00
## Year                      1.300000e+01   0.10    -1.08         0.07        6.00
## AR_by_OpIncome            8.588000e+03   0.82    -0.44        43.23     3805.50
## FB_Plus_OpInc_ByFB        2.199500e+02  31.49  1332.99         0.08        0.84
## PercentMedicaidDays       8.300000e-01   2.65    13.04         0.00        0.08
## PercentMedicareDays       8.300000e-01   0.18     0.45         0.00        0.14
## CurrentRatio              7.168160e+03  54.80  3007.91         2.35        1.58
## Debt2Equity               6.967300e+02   6.10   387.05         0.25        1.68
## DaysSalesOutstanding      5.973620e+03  22.95   943.50         1.91       18.48
## LaborCompRatio            6.290000e+00   7.47    62.91         0.01        0.18
## OpProfitMargin            1.126000e+01  -7.88    67.86         0.02        0.20
## DaysCashOnHand            2.377350e+03   8.31   113.79         1.60       30.65
## BedUtil                   9.900000e-01   0.47    -0.43         0.00        0.28
## AdjPxDays                 1.257886e+06   4.63    36.22      1409.73    39174.99
## Alt1Ohls3                 3.786155e+10 -12.35   743.89  11274787.81        0.33
## AltmanX2                  2.602344e+10 -39.00  1577.65   9936538.69        0.21
## AltmanX3                  7.463346e+09 -33.70  1325.01   2550332.01        0.25
## AltmanX4                  1.760199e+11  35.97  1652.67  58475676.76        0.32
## OhlsonX1                  2.839000e+01  -6.08    76.02         0.03        1.48
## OhlsonX2                  3.828390e+10 -43.49  1999.79  13470518.56        0.57
## OhlsonX4                  1.589500e+02   6.14   354.58         0.06        1.26
## OhlsonX6                  1.388120e+10 -49.00  2586.86   4081397.86        0.19
## OhlsonX7                  3.713163e+10  11.09   158.67  25085094.30        0.39
## OhlsonX9                  4.164433e+09  13.71   434.85   1672357.08 11098370.66
## OhlsonX5                  1.000000e+00   1.09    -0.82         0.01        1.00
## OhlsonX8                  1.000000e+00   0.07    -2.00         0.01        1.00
## Govt                      1.000000e+00   3.15     7.95         0.00        0.00
## Urban                     1.000000e+00   3.52    10.42         0.00        0.00
## ForProfit                 1.000000e+00   1.00    -1.00         0.01        1.00
## HC1                       1.000000e+00   4.49    18.13         0.00        0.00
## HC2                       1.000000e+00   1.75     1.08         0.01        0.00
## HC4                       1.000000e+00   2.21     2.90         0.01        0.00
## HC5                       1.000000e+00   3.64    11.24         0.00        0.00
## AR_by_OpIncome.y.1.       8.601000e+03   0.60    -0.65        42.89     3979.75
## FB_Plus_OpInc_ByFB.y.1.   1.608440e+03  41.46  1932.71         0.51        0.43
## PercentMedicaidDays.y.1.  8.300000e-01   2.65    13.04         0.00        0.08
## PercentMedicareDays.y.1.  8.300000e-01   0.18     0.45         0.00        0.14
## CurrentRatio.y.1.         2.269560e+03  29.97  1800.25         0.57        1.49
## Debt2Equity.y.1.          5.095490e+03  42.59  1967.43         1.67        1.22
## DaysSalesOutstanding.y.1. 5.464590e+03  22.84   954.99         1.70       20.99
## LaborCompRatio.y.1.       2.230000e+00   0.89     3.79         0.00        0.19
## OpProfitMargin.y.1.       5.930000e+00  -0.70    45.70         0.00        0.16
## DaysCashOnHand.y.1.       2.695470e+03   8.58   128.54         1.64       34.46
## BedUtil.y.1.              9.800000e-01   0.31    -0.54         0.00        0.27
## AdjPxDays.y.1.            1.415451e+06   5.16    50.40      1377.83    39452.19
## Alt1Ohls3.y.1.            1.424011e+10 -40.43  1713.76   5506072.67        0.25
## AltmanX2.y.1.             1.999279e+09 -33.05  1152.58    870093.95        0.14
## AltmanX3.y.1.             1.542306e+09 -43.22  2071.44    561687.84        0.20
## AltmanX4.y.1.             3.888196e+10  10.40   180.48  21469049.87        0.22
## OhlsonX1.y.1.             2.827000e+01  -5.29    75.55         0.03        1.28
## OhlsonX2.y.1.             3.917888e+09  46.37  2318.26   1386212.29        0.48
## OhlsonX4.y.1.             2.548600e+02 -25.68  1094.24         0.08        0.72
## OhlsonX6.y.1.             1.999279e+09 -37.67  1571.32    713589.43        0.14
## OhlsonX7.y.1.             3.274721e+10  10.91   152.61  23519053.07        0.33
## OhlsonX9.y.1.             6.536766e+09  29.38  1328.83   2128953.27  7800837.04
## OhlsonX5.y.1.             1.000000e+00   2.10     2.40         0.01        0.00
## OhlsonX8.y.1.             1.000000e+00   0.10    -1.99         0.01        1.00
## HC4_5.y.1.                1.000000e+00   1.56     0.44         0.01        0.00
## AR_by_OpIncome.y.2.       8.596000e+03   0.67    -0.49        41.45     3316.00
## FB_Plus_OpInc_ByFB.y.2.   4.225600e+02 -34.57  1450.15         0.13        0.26
## PercentMedicaidDays.y.2.  8.300000e-01   2.65    13.04         0.00        0.08
## PercentMedicareDays.y.2.  8.300000e-01   0.18     0.45         0.00        0.14
## CurrentRatio.y.2.         4.464080e+03  54.27  2967.61         1.47        1.57
## Debt2Equity.y.2.          3.710630e+03 -37.66  1478.22         1.41        1.05
## DaysSalesOutstanding.y.2. 3.263970e+03   8.66   499.68         1.13       20.35
## LaborCompRatio.y.2.       6.570000e+00   5.32   178.17         0.00        0.17
## OpProfitMargin.y.2.       1.776000e+01  -4.84   577.00         0.01        0.11
## DaysCashOnHand.y.2.       2.357040e+03   7.99   121.58         1.50       35.17
## BedUtil.y.2.              9.900000e-01   0.37    -0.63         0.00        0.28
## AdjPxDays.y.2.            1.372416e+06   5.01    48.04      1357.10    41627.15
## Alt1Ohls3.y.2.            1.319598e+10 -32.61  1105.63   6434925.40        0.23
## AltmanX2.y.2.             1.738262e+10 -52.64  2834.00   5597926.60        0.11
## AltmanX3.y.2.             2.263547e+09 -37.28  1426.80    966922.01        0.13
## AltmanX4.y.2.             5.375079e+10   5.97   179.10  24278159.92        0.23
## OhlsonX1.y.2.             2.815000e+01  -5.76    85.29         0.03        1.25
## OhlsonX2.y.2.             3.252191e+09  38.98  1582.79   1310513.44        0.46
## OhlsonX4.y.2.             1.774580e+03  54.19  2964.32         0.56        0.66
## OhlsonX6.y.2.             2.565419e+09 -36.42  1364.61   1185406.76        0.10
## OhlsonX7.y.2.             2.949721e+10  10.92   148.06  23317487.26        0.24
## OhlsonX9.y.2.             5.714365e+09  34.30  1499.80   2067321.03  8645715.23
## OhlsonX5.y.2.             1.000000e+00   2.16     2.68         0.01        0.00
## OhlsonX8.y.2.             1.000000e+00   1.54     0.37         0.01        0.00
## D_AR_by_OpIncome          1.246000e+03  46.18  2368.77         0.44        2.44
## D_FB_Plus_OpInc_ByFB      5.910000e+02  30.20  1279.36         0.18        1.67
## D_CurrentRatio            1.398800e+02 -33.13  1444.16         0.05        0.45
## D_Debt2Equity             4.677200e+02  -1.47   158.50         0.25        0.98
## D_LiabFundBalRatio        2.606400e+02  -6.24   922.89         0.07        0.69
## D_DaysSalesOutstanding    7.656000e+01   8.36   135.41         0.04        0.28
## D_LaborCompRatio          1.076000e+01   5.81    58.49         0.01        0.11
## D_OpProfitMargin          1.790000e+02  -6.23   354.76         0.06        1.35
## D_DaysCashOnHand          1.759000e+04  47.56  2421.52         5.92        0.98
## D_BedUtil                 4.430000e+00   6.00    42.64         0.01        0.14
## D_AdjPxDays               5.501000e+01  52.67  2852.02         0.02        0.10
## D_Alt1Ohls3               9.303106e+10 -53.86  2934.59  29946667.80        1.03
## D_AltmanX2                7.523297e+10  52.88  2853.66  25159328.93        2.75
## D_AltmanX3                3.406117e+10  38.39  1490.94  15151837.58        3.24
## D_AltmanX4                5.960000e+11  43.04  2305.70 159542032.39        2.40
## D_OhlsonX1                3.620000e+00 -15.37   297.07         0.00        0.02
## D_OhlsonX2                7.713030e+10 -28.62  1741.39  19704719.34        0.23
## D_OhlsonX4                1.365200e+02  25.58  1160.07         0.04        0.76
## D_OhlsonX6                5.543999e+10  52.98  2863.21  18565855.67        2.10
## D_OhlsonX7                9.639146e+10  -4.18   905.40  26457235.06        3.84
## D_OhlsonX9                2.107315e+09  54.95  3019.00    696395.94        2.53
##                                 Q0.25      Q0.75
## Bankrupt                         0.00       1.00
## Year                          2011.00    2017.00
## AR_by_OpIncome                 660.25    4465.75
## FB_Plus_OpInc_ByFB               0.27       1.11
## PercentMedicaidDays              0.03       0.11
## PercentMedicareDays              0.26       0.40
## CurrentRatio                     0.55       2.14
## Debt2Equity                      0.02       1.70
## DaysSalesOutstanding            37.28      55.76
## LaborCompRatio                   0.39       0.57
## OpProfitMargin                  -0.20       0.00
## DaysCashOnHand                   0.03      30.68
## BedUtil                          0.27       0.55
## AdjPxDays                    26968.13   66143.12
## Alt1Ohls3                       -0.14       0.19
## AltmanX2                        -0.16       0.05
## AltmanX3                        -0.19       0.06
## AltmanX4                        -0.18       0.13
## OhlsonX1                        10.73      12.21
## OhlsonX2                         0.37       0.94
## OhlsonX4                         0.44       1.70
## OhlsonX6                        -0.14       0.05
## OhlsonX7                        -0.22       0.17
## OhlsonX9                  -6451156.41 4647214.25
## OhlsonX5                         0.00       1.00
## OhlsonX8                         0.00       1.00
## Govt                             0.00       0.00
## Urban                            0.00       0.00
## ForProfit                        0.00       1.00
## HC1                              0.00       0.00
## HC2                              0.00       0.00
## HC4                              0.00       0.00
## HC5                              0.00       0.00
## AR_by_OpIncome.y.1.            508.25    4488.00
## FB_Plus_OpInc_ByFB.y.1.          0.66       1.09
## PercentMedicaidDays.y.1.         0.03       0.11
## PercentMedicareDays.y.1.         0.26       0.40
## CurrentRatio.y.1.                0.84       2.33
## Debt2Equity.y.1.                 0.05       1.27
## DaysSalesOutstanding.y.1.       42.32      63.31
## LaborCompRatio.y.1.              0.38       0.57
## OpProfitMargin.y.1.             -0.16       0.00
## DaysCashOnHand.y.1.              3.92      38.38
## BedUtil.y.1.                     0.30       0.56
## AdjPxDays.y.1.               29208.52   68660.71
## Alt1Ohls3.y.1.                  -0.05       0.20
## AltmanX2.y.1.                   -0.09       0.05
## AltmanX3.y.1.                   -0.14       0.06
## AltmanX4.y.1.                   -0.12       0.10
## OhlsonX1.y.1.                   10.89      12.17
## OhlsonX2.y.1.                    0.37       0.85
## OhlsonX4.y.1.                    0.38       1.10
## OhlsonX6.y.1.                   -0.10       0.04
## OhlsonX7.y.1.                   -0.20       0.13
## OhlsonX9.y.1.             -3216962.29 4583874.75
## OhlsonX5.y.1.                    0.00       0.00
## OhlsonX8.y.1.                    0.00       1.00
## HC4_5.y.1.                       0.00       0.00
## AR_by_OpIncome.y.2.           1173.75    4489.75
## FB_Plus_OpInc_ByFB.y.2.          0.84       1.10
## PercentMedicaidDays.y.2.         0.03       0.11
## PercentMedicareDays.y.2.         0.26       0.40
## CurrentRatio.y.2.                1.08       2.65
## Debt2Equity.y.2.                 0.09       1.14
## DaysSalesOutstanding.y.2.       44.67      65.02
## LaborCompRatio.y.2.              0.37       0.54
## OpProfitMargin.y.2.             -0.10       0.01
## DaysCashOnHand.y.2.              2.52      37.69
## BedUtil.y.2.                     0.29       0.57
## AdjPxDays.y.2.               29299.54   70926.69
## Alt1Ohls3.y.2.                  -0.02       0.21
## AltmanX2.y.2.                   -0.04       0.07
## AltmanX3.y.2.                   -0.06       0.07
## AltmanX4.y.2.                   -0.05       0.18
## OhlsonX1.y.2.                   10.90      12.15
## OhlsonX2.y.2.                    0.36       0.82
## OhlsonX4.y.2.                    0.38       1.04
## OhlsonX6.y.2.                   -0.05       0.06
## OhlsonX7.y.2.                   -0.09       0.16
## OhlsonX9.y.2.             -2703467.05 5942248.17
## OhlsonX5.y.2.                    0.00       0.00
## OhlsonX8.y.2.                    0.00       0.00
## D_AR_by_OpIncome                -0.32       2.12
## D_FB_Plus_OpInc_ByFB            -1.66       0.01
## D_CurrentRatio                  -0.40       0.06
## D_Debt2Equity                   -0.15       0.82
## D_LiabFundBalRatio              -0.20       0.49
## D_DaysSalesOutstanding          -0.18       0.09
## D_LaborCompRatio                -0.04       0.06
## D_OpProfitMargin                -0.47       0.88
## D_DaysCashOnHand                -0.81       0.17
## D_BedUtil                       -0.11       0.04
## D_AdjPxDays                     -0.06       0.04
## D_Alt1Ohls3                     -0.78       0.25
## D_AltmanX2                      -1.25       1.50
## D_AltmanX3                      -3.08       0.16
## D_AltmanX4                      -1.50       0.90
## D_OhlsonX1                      -0.01       0.01
## D_OhlsonX2                      -0.05       0.18
## D_OhlsonX4                      -0.06       0.70
## D_OhlsonX6                      -0.74       1.36
## D_OhlsonX7                      -3.68       0.17
## D_OhlsonX9                      -1.51       1.03

Interim Write/Read

setwd("/Users/arvindsharma/Library/CloudStorage/GoogleDrive-sharmaar@bc.edu/My Drive/hospital_bankrutcy/clean_data/")

write.csv(train, 'train.csv', row.names = FALSE)
write.csv(test,'test.csv', row.names=FALSE)

train=read.csv('train.csv')
test=read.csv('test.csv')

R Models

Repeated Functions

myr2=function(mod) NagelkerkeR2(mod)$R2
myF1=function(mod,dat) {
  mypred=round(predict(mod, dat, type='response'),3)
  mypred=ifelse(mypred<.5,0,1)
  return(F1_Score(dat$Bankrupt,mypred))}
mycm=function(mod,dat){
  mypred=round(predict(mod, dat, type='response'),3)
  mypred=ifelse(mypred<.5,0,1)
  confusionMatrix(as.factor(mypred), as.factor(dat$Bankrupt), positive='1')}
mylinearity=function(mod, dat){
  mypred=round(predict(mod, dat, type='response'),3)
  logits=log(mypred/(1-mypred))
  forplot=select_if(dat,is.numeric)
  for(i in 1:ncol(forplot)){
    print(plot(forplot[,i]~logits, ylab=colnames(forplot)[i], col='blue'))}}
myoutliers=function(mod) print(plot(mod, which = 4, id.n = 5))
mycoef=function(mod){
  mys=summary(mod)
  myvif=noquote(c(NA,vif(mod)))
  names(myvif)='VIF'
  newcoefs=cbind(round(mys$coefficients,6), myvif)
  newcoefs=round(newcoefs,6)
  colnames(newcoefs)=c('LR', 'SE', 'Z', 'P(Z)', 'VIF')
  newcoefs=data.frame(newcoefs)
  newcoefs$OR=round(exp(newcoefs$LR),6)
  newcoefs$Low=round(exp(newcoefs$LR-1.96*newcoefs$SE),6)
  newcoefs$High=round(exp(newcoefs$LR+1.96*newcoefs$SE),6)
  print(newcoefs[-1,])
  return(newcoefs[2:length(mod$coefficients),])
}

Investigatory glmnet

ratios=train[, c(1, 34:ncol(train))]


myglmnet=glmnet(x=as.matrix(ratios[, c( 2:ncol(ratios))]), y=as.factor(ratios$Bankrupt), family='binomial', alpha=1, lambda=.04, scale=T)
a=round(myglmnet$beta[,1],11)
a[a!=0]
##      AR_by_OpIncome.y.1. PercentMedicareDays.y.1.      OpProfitMargin.y.1. 
##            -1.232316e-04             6.032345e-02            -1.396351e-01 
##             BedUtil.y.1.           AdjPxDays.y.1.            OhlsonX5.y.1. 
##            -2.747076e+00            -1.096450e-06            -2.283475e-01 
##            OhlsonX8.y.1.               HC4_5.y.1.      AR_by_OpIncome.y.2. 
##             7.029180e-01            -1.826598e+00            -2.056749e-04 
## PercentMedicareDays.y.2.            OhlsonX8.y.2.            D_Debt2Equity 
##             4.767657e-02            -1.331080e+00             8.293269e-03 
##               D_OhlsonX4 
##             4.015573e-03

M1:LogReg

vars=c('Bankrupt','D_LaborCompRatio','AR_by_OpIncome.y.1.','CurrentRatio.y.1.','D_OhlsonX4', 
       'AdjPxDays.y.1.', 'PercentMedicaidDays.y.1.', 'HC4_5.y.1.' )

hmodtrain=train[-1013,vars] #Eliminating one outlier, obs #1429, with Cook's distance >1
hmodtest=test[, vars]
suppressWarnings({hmodglm=glm(as.factor(Bankrupt) ~ ., family = "binomial",  data = hmodtrain)})

#Nagelkerke and F1 Score
n1=myr2(hmodglm); noquote(paste('R2:', n1))
## [1] R2: 0.583915678844047
f1_1=myF1(hmodglm, hmodtest); noquote(paste('F1:', f1_1))
## [1] F1: 0.869144981412639
# Confusion Report
(mycm1=mycm(hmodglm,hmodtest))
## Confusion Matrix and Statistics
## 
##           Reference
## Prediction    0    1
##          0 1169    8
##          1  344   25
##                                          
##                Accuracy : 0.7723         
##                  95% CI : (0.7506, 0.793)
##     No Information Rate : 0.9787         
##     P-Value [Acc > NIR] : 1              
##                                          
##                   Kappa : 0.0887         
##                                          
##  Mcnemar's Test P-Value : <2e-16         
##                                          
##             Sensitivity : 0.75758        
##             Specificity : 0.77264        
##          Pos Pred Value : 0.06775        
##          Neg Pred Value : 0.99320        
##              Prevalence : 0.02135        
##          Detection Rate : 0.01617        
##    Detection Prevalence : 0.23868        
##       Balanced Accuracy : 0.76511        
##                                          
##        'Positive' Class : 1              
## 
#Linearity
mylinearity(hmodglm,hmodtrain)

## NULL

## NULL

## NULL

## NULL

## NULL

## NULL

## NULL

## NULL
#Outliers
myoutliers(hmodglm)

## NULL
#Coefficients
forexport1=mycoef(hmodglm)
##                                 LR       SE          Z     P.Z.      VIF
## D_LaborCompRatio          2.187134 0.305367   7.162312 0.000000 1.057340
## AR_by_OpIncome.y.1.      -0.000417 0.000025 -16.652760 0.000000 1.072882
## CurrentRatio.y.1.        -0.121242 0.017253  -7.027258 0.000000 1.066810
## D_OhlsonX4                0.258733 0.045582   5.676244 0.000000 1.051712
## AdjPxDays.y.1.           -0.000023 0.000002 -13.627712 0.000000 1.060797
## PercentMedicaidDays.y.1. -1.059331 0.599030  -1.768409 0.076993 1.030652
## HC4_5.y.1.               -4.460615 0.322527 -13.830221 0.000000 1.037838
##                                OR      Low      High
## D_LaborCompRatio         8.909641 4.896960 16.210405
## AR_by_OpIncome.y.1.      0.999583 0.999534  0.999632
## CurrentRatio.y.1.        0.885820 0.856366  0.916287
## D_OhlsonX4               1.295288 1.184585  1.416337
## AdjPxDays.y.1.           0.999977 0.999973  0.999981
## PercentMedicaidDays.y.1. 0.346688 0.107160  1.121613
## HC4_5.y.1.               0.011555 0.006141  0.021743

M2: Altman Only

alttrain=train[, c(1, 46:49)]
alttest=test[,c(1,46:49)]

suppressWarnings({myalt=glm(as.factor(Bankrupt)~., data=alttrain, family='binomial')})

#Nagelkerke and F1 Score
n2=myr2(myalt); noquote(paste('R2:', n1))
## [1] R2: 0.583915678844047
f1_2=myF1(myalt, alttest); noquote(paste('F1:', f1_2))
## [1] F1: 0.130783466995682
# Confusion Report
(mycm2=mycm(myalt,alttest))
## Confusion Matrix and Statistics
## 
##           Reference
## Prediction    0    1
##          0  106    2
##          1 1407   31
##                                           
##                Accuracy : 0.0886          
##                  95% CI : (0.0749, 0.1039)
##     No Information Rate : 0.9787          
##     P-Value [Acc > NIR] : 1               
##                                           
##                   Kappa : 4e-04           
##                                           
##  Mcnemar's Test P-Value : <2e-16          
##                                           
##             Sensitivity : 0.93939         
##             Specificity : 0.07006         
##          Pos Pred Value : 0.02156         
##          Neg Pred Value : 0.98148         
##              Prevalence : 0.02135         
##          Detection Rate : 0.02005         
##    Detection Prevalence : 0.93014         
##       Balanced Accuracy : 0.50473         
##                                           
##        'Positive' Class : 1               
## 
#Linearity
mylinearity(myalt,alttrain)

## NULL

## NULL

## NULL

## NULL

## NULL
#Outliers
myoutliers(myalt)

## NULL
#Coefficients
forexport2=mycoef(myalt)
##                LR    SE         Z     P.Z.       VIF OR      Low     High
## Alt1Ohls3.y.1.  0 0e+00  0.037782 0.969862  1.402607  1 1.000000 1.000000
## AltmanX2.y.1.   0 2e-06  0.006925 0.994475 13.990556  1 0.999996 1.000004
## AltmanX3.y.1.   0 3e-06  0.004115 0.996717 13.631483  1 0.999994 1.000006
## AltmanX4.y.1.   0 0e+00 -4.931040 0.000001  1.000000  1 1.000000 1.000000

M3: Ohlson

ohltrain=train[, c(1, 46, 50:57)]
ohltest=test[, c(1, 46, 50:57)]

suppressWarnings({myohl=glm(as.factor(Bankrupt)~.,data=ohltrain, family='binomial')})

#Nagelkerke and F1 Score
n3=myr2(myohl); noquote(paste('R2:', n1))
## [1] R2: 0.583915678844047
f1_3=myF1(myohl, ohltest); noquote(paste('F1:', f1_3))
## [1] F1: 0.66870095902354
# Confusion Report
(mycm3=mycm(myohl,ohltest))
## Confusion Matrix and Statistics
## 
##           Reference
## Prediction   0   1
##          0 767  14
##          1 746  19
##                                           
##                Accuracy : 0.5084          
##                  95% CI : (0.4832, 0.5336)
##     No Information Rate : 0.9787          
##     P-Value [Acc > NIR] : 1               
##                                           
##                   Kappa : 0.007           
##                                           
##  Mcnemar's Test P-Value : <2e-16          
##                                           
##             Sensitivity : 0.57576         
##             Specificity : 0.50694         
##          Pos Pred Value : 0.02484         
##          Neg Pred Value : 0.98207         
##              Prevalence : 0.02135         
##          Detection Rate : 0.01229         
##    Detection Prevalence : 0.49483         
##       Balanced Accuracy : 0.54135         
##                                           
##        'Positive' Class : 1               
## 
#Linearity
try(mylinearity(myohl,ohltrain))
## Warning in min(x): no non-missing arguments to min; returning Inf
## Warning in max(x): no non-missing arguments to max; returning -Inf

## Error in h(simpleError(msg, call)) : 
##   error in evaluating the argument 'x' in selecting a method for function 'print': need finite 'xlim' values
#Outliers
myoutliers(myohl)
## NULL
#Coefficients
forexport3=mycoef(myohl)
##                           LR           SE          Z P.Z.      VIF  OR Low High
## Alt1Ohls3.y.1.  6.040959e+05 5.570000e-03  108448464    0 1.911980 Inf Inf  Inf
## OhlsonX1.y.1.  -4.321056e+14 9.484355e+05 -455598267    0 1.571997   0   0    0
## OhlsonX2.y.1.  -6.339584e+06 1.952300e-02 -324718879    0 1.488677   0   0    0
## OhlsonX4.y.1.   5.974132e+13 2.816977e+05  212076015    0 1.025037 Inf Inf  Inf
## OhlsonX6.y.1.   1.165678e+07 4.692300e-02  248424767    0 2.278761 Inf Inf  Inf
## OhlsonX7.y.1.  -1.018592e+05 9.600000e-04 -106111569    0 1.035975   0   0    0
## OhlsonX9.y.1.  -1.885053e+05 1.055300e-02  -17862629    0 1.025942   0   0    0
## OhlsonX5.y.1.  -1.783075e+15 3.582554e+06 -497710424    0 1.026693   0   0    0
## OhlsonX8.y.1.   1.720915e+14 2.637377e+06   65250988    0 1.165535 Inf Inf  Inf

Model Comparisons

options(scipen=999)
n3=0 #infeasible value
cms=rbind(mycm1$byClass,mycm2$byClass,mycm3$byClass)
rownames(cms)=c("New", "Altman", "Ohlson")
cms=as.data.frame(cms)
cms$Nagelkerke=c(n1,n2,n3)
cms$F1=NULL
cms$F1=rbind(f1_1,f1_2,f1_3)
cms=as.data.frame(t(cms))
round(cms,3)
##                        New Altman Ohlson
## Sensitivity          0.758  0.939  0.576
## Specificity          0.773  0.070  0.507
## Pos Pred Value       0.068  0.022  0.025
## Neg Pred Value       0.993  0.981  0.982
## Precision            0.068  0.022  0.025
## Recall               0.758  0.939  0.576
## Prevalence           0.021  0.021  0.021
## Detection Rate       0.016  0.020  0.012
## Detection Prevalence 0.239  0.930  0.495
## Balanced Accuracy    0.765  0.505  0.541
## Nagelkerke           0.584  0.040  0.000
## F1                   0.869  0.131  0.669

Citations

temp=library()$results[,1]
lapply(temp, citation)
## Warning in FUN(X[[i]], ...): no date field in DESCRIPTION file of package
## 'blsAPI'
## Warning in FUN(X[[i]], ...): no date field in DESCRIPTION file of package
## 'kableExtra'
## Warning in FUN(X[[i]], ...): no date field in DESCRIPTION file of package 'LST'
## Warning in FUN(X[[i]], ...): no date field in DESCRIPTION file of package
## 'rticles'
## Warning in FUN(X[[i]], ...): no date field in DESCRIPTION file of package
## 'tsibbledata'
## Warning in FUN(X[[i]], ...): no date field in DESCRIPTION file of package
## 'kableExtra'
## [[1]]
## 
## To cite AER, please use:
## 
##   Christian Kleiber and Achim Zeileis (2008). Applied Econometrics with
##   R. New York: Springer-Verlag. ISBN 978-0-387-77316-2. URL
##   https://CRAN.R-project.org/package=AER
## 
## A BibTeX entry for LaTeX users is
## 
##   @Book{,
##     title = {Applied Econometrics with {R}},
##     author = {Christian Kleiber and Achim Zeileis},
##     year = {2008},
##     publisher = {Springer-Verlag},
##     address = {New York},
##     note = {{ISBN} 978-0-387-77316-2},
##     url = {https://CRAN.R-project.org/package=AER},
##   }
## 
## 
## 
## 
## [[2]]
## 
## To cite package 'alphavantager' in publications use:
## 
##   Dancho M, Vaughan D (2023). _alphavantager: Lightweight Interface to
##   the Alpha Vantage API_. R package version 0.1.3,
##   <https://CRAN.R-project.org/package=alphavantager>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {alphavantager: Lightweight Interface to the Alpha Vantage API},
##     author = {Matt Dancho and Davis Vaughan},
##     year = {2023},
##     note = {R package version 0.1.3},
##     url = {https://CRAN.R-project.org/package=alphavantager},
##   }
## 
## 
## 
## 
## [[3]]
## 
## To cite Amelia in publications use:
## 
##   James Honaker, Gary King, Matthew Blackwell (2011). Amelia II: A
##   Program for Missing Data. Journal of Statistical Software, 45(7),
##   1-47. URL https://www.jstatsoft.org/v45/i07/.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Article{,
##     title = {{Amelia II}: A Program for Missing Data},
##     author = {James Honaker and Gary King and Matthew Blackwell},
##     journal = {Journal of Statistical Software},
##     year = {2011},
##     volume = {45},
##     number = {7},
##     pages = {1--47},
##     doi = {10.18637/jss.v045.i07},
##   }
## 
## 
## [[4]]
## 
## To cite package 'anytime' in publications use:
## 
##   Eddelbuettel D (2020). _anytime: Anything to 'POSIXct' or 'Date'
##   Converter_. R package version 0.3.9,
##   <https://CRAN.R-project.org/package=anytime>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {anytime: Anything to 'POSIXct' or 'Date' Converter},
##     author = {Dirk Eddelbuettel},
##     year = {2020},
##     note = {R package version 0.3.9},
##     url = {https://CRAN.R-project.org/package=anytime},
##   }
## 
## ATTENTION: This citation information has been auto-generated from the
## package DESCRIPTION file and may need manual editing, see
## 'help("citation")'.
## 
## 
## 
## 
## [[5]]
## 
## To cite package 'arm' in publications use:
## 
##   Gelman A, Su Y (2022). _arm: Data Analysis Using Regression and
##   Multilevel/Hierarchical Models_. R package version 1.13-1,
##   <https://CRAN.R-project.org/package=arm>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {arm: Data Analysis Using Regression and Multilevel/Hierarchical
## Models},
##     author = {Andrew Gelman and Yu-Sung Su},
##     year = {2022},
##     note = {R package version 1.13-1},
##     url = {https://CRAN.R-project.org/package=arm},
##   }
## 
## 
## 
## 
## [[6]]
## 
## To cite package 'askpass' in publications use:
## 
##   Ooms J (2023). _askpass: Password Entry Utilities for R, Git, and
##   SSH_. R package version 1.2.0,
##   <https://CRAN.R-project.org/package=askpass>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {askpass: Password Entry Utilities for R, Git, and SSH},
##     author = {Jeroen Ooms},
##     year = {2023},
##     note = {R package version 1.2.0},
##     url = {https://CRAN.R-project.org/package=askpass},
##   }
## 
## 
## 
## 
## [[7]]
## 
## To cite package 'BayesFactor' in publications use:
## 
##   Morey R, Rouder J (2022). _BayesFactor: Computation of Bayes Factors
##   for Common Designs_. R package version 0.9.12-4.4,
##   <https://CRAN.R-project.org/package=BayesFactor>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {BayesFactor: Computation of Bayes Factors for Common Designs},
##     author = {Richard D. Morey and Jeffrey N. Rouder},
##     year = {2022},
##     note = {R package version 0.9.12-4.4},
##     url = {https://CRAN.R-project.org/package=BayesFactor},
##   }
## 
## 
## 
## 
## [[8]]
## 
## To cite bayestestR in publications use:
## 
##   Makowski, D., Ben-Shachar, M., & Lüdecke, D. (2019). bayestestR:
##   Describing Effects and their Uncertainty, Existence and Significance
##   within the Bayesian Framework. Journal of Open Source Software,
##   4(40), 1541. doi:10.21105/joss.01541
## 
## A BibTeX entry for LaTeX users is
## 
##   @Article{,
##     title = {bayestestR: Describing Effects and their Uncertainty, Existence and Significance within the Bayesian Framework.},
##     author = {Dominique Makowski and Mattan S. Ben-Shachar and Daniel Lüdecke},
##     journal = {Journal of Open Source Software},
##     doi = {10.21105/joss.01541},
##     year = {2019},
##     number = {40},
##     volume = {4},
##     pages = {1541},
##     url = {https://joss.theoj.org/papers/10.21105/joss.01541},
##   }
## 
## 
## [[9]]
## 
## To cite package 'bazar' in publications use:
## 
##   Poncet P (2019). _bazar: Miscellaneous Basic Functions_. R package
##   version 1.0.11, <https://CRAN.R-project.org/package=bazar>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {bazar: Miscellaneous Basic Functions},
##     author = {Paul Poncet},
##     year = {2019},
##     note = {R package version 1.0.11},
##     url = {https://CRAN.R-project.org/package=bazar},
##   }
## 
## 
## 
## 
## [[10]]
## 
## To cite package 'BBmisc' in publications use:
## 
##   Bischl B, Lang M, Bossek J, Horn D, Richter J, Surmann D (2022).
##   _BBmisc: Miscellaneous Helper Functions for B. Bischl_. R package
##   version 1.13, <https://CRAN.R-project.org/package=BBmisc>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {BBmisc: Miscellaneous Helper Functions for B. Bischl},
##     author = {Bernd Bischl and Michel Lang and Jakob Bossek and Daniel Horn and Jakob Richter and Dirk Surmann},
##     year = {2022},
##     note = {R package version 1.13},
##     url = {https://CRAN.R-project.org/package=BBmisc},
##   }
## 
## 
## 
## 
## [[11]]
## 
## To cite package 'bibtex' in publications use:
## 
##   Francois R, Hernangómez D (2023). _bibtex: Bibtex Parser_. R package
##   version 0.5.1, <https://CRAN.R-project.org/package=bibtex>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {bibtex: Bibtex Parser},
##     author = {Romain Francois and Diego Hernangómez},
##     year = {2023},
##     note = {R package version 0.5.1},
##     url = {https://CRAN.R-project.org/package=bibtex},
##   }
## 
## 
## 
## 
## [[12]]
## 
## To cite package 'BiocManager' in publications use:
## 
##   Morgan M (2022). _BiocManager: Access the Bioconductor Project
##   Package Repository_. R package version 1.30.19,
##   <https://CRAN.R-project.org/package=BiocManager>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {BiocManager: Access the Bioconductor Project Package Repository},
##     author = {Martin Morgan},
##     year = {2022},
##     note = {R package version 1.30.19},
##     url = {https://CRAN.R-project.org/package=BiocManager},
##   }
## 
## 
## 
## 
## [[13]]
## 
## To cite package 'blsAPI' in publications use:
## 
##   Silva M (2023). _blsAPI: Request Data from the U.S. Bureau of Labor
##   Statistics API_. R package version 0.2.2.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {blsAPI: Request Data from the U.S. Bureau of Labor Statistics API},
##     author = {Michael Silva},
##     year = {2023},
##     note = {R package version 0.2.2},
##   }
## 
## ATTENTION: This citation information has been auto-generated from the
## package DESCRIPTION file and may need manual editing, see
## 'help("citation")'.
## 
## 
## 
## 
## [[14]]
## 
## To cite bnlearn in publications use the most appropriate among:
## 
## A teaching book about Bayesian networks based on bnlearn:
## 
##   Marco Scutari, Jean-Baptiste Denis. (2021) Bayesian Networks with
##   Examples in R, 2nd edition. Chapman and Hall, Boca Raton. ISBN
##   978-0367366513.
## 
## To cite applications of Bayesian networks in genetics and systems
## biology you may want to use:
## 
##   Radhakrishnan Nagarajan, Marco Scutari, Sophie Lebre. (2013) Bayesian
##   Networks in R with Applications in Systems Biology. Springer, New
##   York. ISBN 978-1-4614-6445-7.
## 
## To cite parallel computing for bnlearn in publications use:
## 
##   Marco Scutari (2017). Bayesian Network Constraint-Based Structure
##   Learning Algorithms: Parallel and Optimized Implementations in the
##   bnlearn R Package. Journal of Statistical Software, 77(2), 1-20.
##   doi:10.18637/jss.v077.i02
## 
## To cite general use of bnlearn in publications use:
## 
##   Marco Scutari (2010). Learning Bayesian Networks with the bnlearn R
##   Package. Journal of Statistical Software, 35(3), 1-22. URL
##   http://www.jstatsoft.org/v35/i03/.
## 
## This last is the original JSS paper for the package.
## To see these entries in BibTeX format, use 'print(<citation>,
## bibtex=TRUE)', 'toBibtex(.)', or set
## 'options(citation.bibtex.max=999)'.
## 
## 
## [[15]]
## 
## To cite the 'boot' package in publications use:
## 
##   Angelo Canty and Brian Ripley (2022). boot: Bootstrap R (S-Plus)
##   Functions. R package version 1.3-28.1.
## 
##   Davison, A. C. & Hinkley, D. V. (1997) Bootstrap Methods and Their
##   Applications. Cambridge University Press, Cambridge. ISBN
##   0-521-57391-2
## 
## To see these entries in BibTeX format, use 'print(<citation>,
## bibtex=TRUE)', 'toBibtex(.)', or set
## 'options(citation.bibtex.max=999)'.
## 
## 
## [[16]]
## 
## To cite package 'bslib' in publications use:
## 
##   Sievert C, Cheng J, Aden-Buie G (2023). _bslib: Custom 'Bootstrap'
##   'Sass' Themes for 'shiny' and 'rmarkdown'_. R package version 0.5.0,
##   <https://CRAN.R-project.org/package=bslib>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {bslib: Custom 'Bootstrap' 'Sass' Themes for 'shiny' and 'rmarkdown'},
##     author = {Carson Sievert and Joe Cheng and Garrick Aden-Buie},
##     year = {2023},
##     note = {R package version 0.5.0},
##     url = {https://CRAN.R-project.org/package=bslib},
##   }
## 
## 
## 
## 
## [[17]]
## 
## To cite package 'C50' in publications use:
## 
##   Kuhn M, Quinlan R (2023). _C50: C5.0 Decision Trees and Rule-Based
##   Models_. R package version 0.1.8,
##   <https://CRAN.R-project.org/package=C50>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {C50: C5.0 Decision Trees and Rule-Based Models},
##     author = {Max Kuhn and Ross Quinlan},
##     year = {2023},
##     note = {R package version 0.1.8},
##     url = {https://CRAN.R-project.org/package=C50},
##   }
## 
## 
## 
## 
## [[18]]
## 
## To cite package 'cachem' in publications use:
## 
##   Chang W (2023). _cachem: Cache R Objects with Automatic Pruning_. R
##   package version 1.0.8, <https://CRAN.R-project.org/package=cachem>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {cachem: Cache R Objects with Automatic Pruning},
##     author = {Winston Chang},
##     year = {2023},
##     note = {R package version 1.0.8},
##     url = {https://CRAN.R-project.org/package=cachem},
##   }
## 
## 
## 
## 
## [[19]]
## 
## To cite package 'Cairo' in publications use:
## 
##   Urbanek S, Horner J (2023). _Cairo: R Graphics Device using Cairo
##   Graphics Library for Creating High-Quality Bitmap (PNG, JPEG, TIFF),
##   Vector (PDF, SVG, PostScript) and Display (X11 and Win32) Output_. R
##   package version 1.6-1, <https://CRAN.R-project.org/package=Cairo>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {Cairo: R Graphics Device using Cairo Graphics Library for Creating
## High-Quality Bitmap (PNG, JPEG, TIFF), Vector (PDF, SVG,
## PostScript) and Display (X11 and Win32) Output},
##     author = {Simon Urbanek and Jeffrey Horner},
##     year = {2023},
##     note = {R package version 1.6-1},
##     url = {https://CRAN.R-project.org/package=Cairo},
##   }
## 
## ATTENTION: This citation information has been auto-generated from the
## package DESCRIPTION file and may need manual editing, see
## 'help("citation")'.
## 
## 
## 
## 
## [[20]]
## 
## To cite the car package in publications use:
## 
##   Fox J, Weisberg S (2019). _An R Companion to Applied Regression_,
##   Third edition. Sage, Thousand Oaks CA.
##   <https://socialsciences.mcmaster.ca/jfox/Books/Companion/>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Book{,
##     title = {An {R} Companion to Applied Regression},
##     edition = {Third},
##     author = {John Fox and Sanford Weisberg},
##     year = {2019},
##     publisher = {Sage},
##     address = {Thousand Oaks {CA}},
##     url = {https://socialsciences.mcmaster.ca/jfox/Books/Companion/},
##   }
## 
## 
## [[21]]
## 
## To cite package 'carData' in publications use:
## 
##   Fox J, Weisberg S, Price B (2022). _carData: Companion to Applied
##   Regression Data Sets_. R package version 3.0-5,
##   <https://CRAN.R-project.org/package=carData>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {carData: Companion to Applied Regression Data Sets},
##     author = {John Fox and Sanford Weisberg and Brad Price},
##     year = {2022},
##     note = {R package version 3.0-5},
##     url = {https://CRAN.R-project.org/package=carData},
##   }
## 
## 
## 
## 
## [[22]]
## 
## To cite caret in publications use:
## 
##   Kuhn, M. (2008). Building Predictive Models in R Using the caret
##   Package. Journal of Statistical Software, 28(5), 1–26.
##   https://doi.org/10.18637/jss.v028.i05
## 
## A BibTeX entry for LaTeX users is
## 
##   @Article{,
##     title = {Building Predictive Models in R Using the caret Package},
##     volume = {28},
##     url = {https://www.jstatsoft.org/index.php/jss/article/view/v028i05},
##     doi = {10.18637/jss.v028.i05},
##     number = {5},
##     journal = {Journal of Statistical Software},
##     author = {{Kuhn} and {Max}},
##     year = {2008},
##     pages = {1–26},
##   }
## 
## 
## [[23]]
## 
## The methods within the code package can be cited as:
## 
##   Gu, Z. (2014) circlize implements and enhances circular visualization
##   in R. Bioinformatics.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Article{,
##     title = {circlize implements and enhances circular visualization in R},
##     author = {Zuguang Gu and Lei Gu and Roland Eils and Matthias Schlesner and Benedikt Brors},
##     journal = {Bioinformatics},
##     volume = {30},
##     issue = {19},
##     pages = {2811-2812},
##     year = {2014},
##   }
## 
## This free open-source software implements academic research by the
## authors and co-workers. If you use it, please support the project by
## citing the appropriate journal articles.
## 
## 
## [[24]]
## 
## To cite package 'ciTools' in publications use:
## 
##   Haman J, Avery M (2020). _ciTools: Confidence or Prediction
##   Intervals, Quantiles, and Probabilities for Statistical Models_. R
##   package version 0.6.1, <https://CRAN.R-project.org/package=ciTools>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {ciTools: Confidence or Prediction Intervals, Quantiles, and Probabilities
## for Statistical Models},
##     author = {John Haman and Matthew Avery},
##     year = {2020},
##     note = {R package version 0.6.1},
##     url = {https://CRAN.R-project.org/package=ciTools},
##   }
## 
## 
## 
## 
## [[25]]
## 
## To cite package 'citr' in publications use:
## 
##   Aust F (2019). _citr: 'RStudio' Add-in to Insert Markdown Citations_.
##   R package version 0.3.2, <https://github.com/crsh/citr>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {citr: 'RStudio' Add-in to Insert Markdown Citations},
##     author = {Frederik Aust},
##     year = {2019},
##     note = {R package version 0.3.2},
##     url = {https://github.com/crsh/citr},
##   }
## 
## 
## 
## 
## [[26]]
## 
## To cite package 'cli' in publications use:
## 
##   Csárdi G (2023). _cli: Helpers for Developing Command Line
##   Interfaces_. R package version 3.6.1,
##   <https://CRAN.R-project.org/package=cli>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {cli: Helpers for Developing Command Line Interfaces},
##     author = {Gábor Csárdi},
##     year = {2023},
##     note = {R package version 3.6.1},
##     url = {https://CRAN.R-project.org/package=cli},
##   }
## 
## 
## 
## 
## [[27]]
## 
## To cite package 'collections' in publications use:
## 
##   Lai R (2023). _collections: High Performance Container Data Types_. R
##   package version 0.3.7,
##   <https://CRAN.R-project.org/package=collections>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {collections: High Performance Container Data Types},
##     author = {Randy Lai},
##     year = {2023},
##     note = {R package version 0.3.7},
##     url = {https://CRAN.R-project.org/package=collections},
##   }
## 
## 
## 
## 
## [[28]]
## 
## To cite package 'commonmark' in publications use:
## 
##   Ooms J (2023). _commonmark: High Performance CommonMark and Github
##   Markdown Rendering in R_. R package version 1.9.0,
##   <https://CRAN.R-project.org/package=commonmark>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {commonmark: High Performance CommonMark and Github Markdown Rendering in R},
##     author = {Jeroen Ooms},
##     year = {2023},
##     note = {R package version 1.9.0},
##     url = {https://CRAN.R-project.org/package=commonmark},
##   }
## 
## 
## 
## 
## [[29]]
## 
## To cite the CompQuadForm package in publications use:
## 
##   Duchesne, P. and Lafaye De Micheaux, P. (2010) Computing the
##   distribution of quadratic forms: Further comparisons between the
##   Liu-Tang-Zhang approximation and exact methods Computational
##   Statistics and Data Analysis vol. 54, p.858-862
## 
## A BibTeX entry for LaTeX users is
## 
##   @Article{,
##     title = {Computing the distribution of quadratic forms: Further comparisons between the Liu-Tang-Zhang approximation and exact methods},
##     author = {P. Duchesne and P. Lafaye {de Micheaux}},
##     journal = {Computational Statistics and Data Analysis},
##     year = {2010},
##     pages = {858-862},
##     volume = {54},
##   }
## 
## 
## [[30]]
## 
## To cite package 'contfrac' in publications use:
## 
##   Hankin RKS (2018). _contfrac: Continued Fractions_. R package version
##   1.1-12, <https://CRAN.R-project.org/package=contfrac>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {contfrac: Continued Fractions},
##     author = {Robin K. S. Hankin},
##     year = {2018},
##     note = {R package version 1.1-12},
##     url = {https://CRAN.R-project.org/package=contfrac},
##   }
## 
## ATTENTION: This citation information has been auto-generated from the
## package DESCRIPTION file and may need manual editing, see
## 'help("citation")'.
## 
## 
## 
## 
## [[31]]
## 
## To cite package 'cpp11' in publications use:
## 
##   Vaughan D, Hester J, François R (2023). _cpp11: A C++11 Interface for
##   R's C Interface_. R package version 0.4.6,
##   <https://CRAN.R-project.org/package=cpp11>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {cpp11: A C++11 Interface for R's C Interface},
##     author = {Davis Vaughan and Jim Hester and Romain François},
##     year = {2023},
##     note = {R package version 0.4.6},
##     url = {https://CRAN.R-project.org/package=cpp11},
##   }
## 
## 
## 
## 
## [[32]]
## 
## To cite package 'curl' in publications use:
## 
##   Ooms J (2023). _curl: A Modern and Flexible Web Client for R_. R
##   package version 5.1.0, <https://CRAN.R-project.org/package=curl>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {curl: A Modern and Flexible Web Client for R},
##     author = {Jeroen Ooms},
##     year = {2023},
##     note = {R package version 5.1.0},
##     url = {https://CRAN.R-project.org/package=curl},
##   }
## 
## 
## 
## 
## [[33]]
## 
## To cite package 'cvms' in publications use:
## 
##   Olsen L, Zachariae H (2023). _cvms: Cross-Validation for Model
##   Selection_. R package version 1.3.9,
##   <https://CRAN.R-project.org/package=cvms>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {cvms: Cross-Validation for Model Selection},
##     author = {Ludvig Renbo Olsen and Hugh Benjamin Zachariae},
##     year = {2023},
##     note = {R package version 1.3.9},
##     url = {https://CRAN.R-project.org/package=cvms},
##   }
## 
## 
## 
## 
## [[34]]
## 
## To cite dagitty in publications, please use:
## 
##   Johannes Textor, Benito van der Zander, Mark K. Gilthorpe, Maciej
##   Liskiewicz, George T.H. Ellison (2016). Robust causal inference using
##   directed acyclic graphs: the R package 'dagitty'. International
##   Journal of Epidemiology 45(6):1887-1894.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Article{,
##     title = {Robust causal inference using directed acyclic graphs: the R package 'dagitty'},
##     journal = {International Journal of Epidemiology},
##     author = {Johannes Textor and Benito {van der Zander} and Mark S Gilthorpe and Maciej Liśkiewicz and George TH Ellison},
##     volume = {45},
##     number = {6},
##     pages = {1887--1894},
##     year = {2016},
##     doi = {10.1093/ije/dyw341},
##   }
## 
## 
## [[35]]
## 
## To cite package 'DataExplorer' in publications use:
## 
##   Cui B (2020). _DataExplorer: Automate Data Exploration and
##   Treatment_. R package version 0.8.2,
##   <https://CRAN.R-project.org/package=DataExplorer>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {DataExplorer: Automate Data Exploration and Treatment},
##     author = {Boxuan Cui},
##     year = {2020},
##     note = {R package version 0.8.2},
##     url = {https://CRAN.R-project.org/package=DataExplorer},
##   }
## 
## 
## 
## 
## [[36]]
## 
## To cite package 'datawizard' in publications use:
## 
##   Patil et al., (2022). datawizard: An R Package for Easy Data
##   Preparation and Statistical Transformations. Journal of Open Source
##   Software, 7(78), 4684, https://doi.org/10.21105/joss.04684
## 
## A BibTeX entry for LaTeX users is
## 
##   @Article{,
##     title = {{datawizard}: An {R} Package for Easy Data Preparation and Statistical Transformations},
##     author = {Indrajeet Patil and Dominique Makowski and Mattan S. Ben-Shachar and Brenton M. Wiernik and Etienne Bacher and Daniel Lüdecke},
##     journal = {Journal of Open Source Software},
##     year = {2022},
##     volume = {7},
##     number = {78},
##     pages = {4684},
##     doi = {10.21105/joss.04684},
##   }
## 
## 
## [[37]]
## 
## Hahsler M, Piekenbrock M (2022). _dbscan: Density-Based Spatial
## Clustering of Applications with Noise (DBSCAN) and Related Algorithms_.
## R package version 1.1-11, <https://CRAN.R-project.org/package=dbscan>.
## 
## To cite dbscan in publications use:
## 
##   Hahsler M, Piekenbrock M, Doran D (2019). "dbscan: Fast Density-Based
##   Clustering with R." _Journal of Statistical Software_, *91*(1), 1-30.
##   doi:10.18637/jss.v091.i01 <https://doi.org/10.18637/jss.v091.i01>.
## 
## To see these entries in BibTeX format, use 'print(<citation>,
## bibtex=TRUE)', 'toBibtex(.)', or set
## 'options(citation.bibtex.max=999)'.
## 
## 
## [[38]]
## 
## The methods within the package can be cited as:
## 
##   Tal Galili (2015). dendextend: an R package for visualizing,
##   adjusting, and comparing trees of hierarchical clustering.
##   Bioinformatics. DOI: 10.1093/bioinformatics/btv428
## 
## A BibTeX entry for LaTeX users is
## 
##   @Article{,
##     author = {Tal Galili},
##     title = {dendextend: an R package for visualizing, adjusting, and comparing trees of hierarchical clustering},
##     journal = {Bioinformatics},
##     year = {2015},
##     doi = {10.1093/bioinformatics/btv428},
##     url = {https://academic.oup.com/bioinformatics/article/31/22/3718/240978/dendextend-an-R-package-for-visualizing-adjusting},
##     eprint = {https://academic.oup.com/bioinformatics/article-pdf/31/22/3718/17122682/btv428.pdf},
##   }
## 
## This free open-source software implements academic research by the
## authors and co-workers. If you use it, please support the project by
## citing the appropriate journal articles.
## 
## 
## 
## 
## [[39]]
## 
## To cite package 'dfidx' in publications use:
## 
##   Croissant Y (2022). _dfidx: Indexed Data Frames_. R package version
##   0.0-5, <https://CRAN.R-project.org/package=dfidx>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {dfidx: Indexed Data Frames},
##     author = {Yves Croissant},
##     year = {2022},
##     note = {R package version 0.0-5},
##     url = {https://CRAN.R-project.org/package=dfidx},
##   }
## 
## 
## 
## 
## [[40]]
## 
## To cite package 'dichromat' in publications use:
## 
##   Lumley T (2022). _dichromat: Color Schemes for Dichromats_. R package
##   version 2.0-0.1, <https://CRAN.R-project.org/package=dichromat>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {dichromat: Color Schemes for Dichromats},
##     author = {Thomas Lumley},
##     year = {2022},
##     note = {R package version 2.0-0.1},
##     url = {https://CRAN.R-project.org/package=dichromat},
##   }
## 
## 
## 
## 
## [[41]]
## 
## To cite package 'digest' in publications use:
## 
##   Lucas DEwcbA, Tuszynski J, Bengtsson H, Urbanek S, Frasca M, Lewis B,
##   Stokely M, Muehleisen H, Murdoch D, Hester J, Wu W, Kou Q, Onkelinx
##   T, Lang M, Simko V, Hornik K, Neal R, Bell K, de Queljoe M, Suruceanu
##   I, Denney B, Schumacher D, Chang W, Attali. D (2023). _digest: Create
##   Compact Hash Digests of R Objects_. R package version 0.6.33,
##   <https://CRAN.R-project.org/package=digest>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {digest: Create Compact Hash Digests of R Objects},
##     author = {Dirk Eddelbuettel with contributions by Antoine Lucas and Jarek Tuszynski and Henrik Bengtsson and Simon Urbanek and Mario Frasca and Bryan Lewis and Murray Stokely and Hannes Muehleisen and Duncan Murdoch and Jim Hester and Wush Wu and Qiang Kou and Thierry Onkelinx and Michel Lang and Viliam Simko and Kurt Hornik and Radford Neal and Kendon Bell and Matthew {de Queljoe} and Ion Suruceanu and Bill Denney and Dirk Schumacher and Winston Chang and Dean Attali.},
##     year = {2023},
##     note = {R package version 0.6.33},
##     url = {https://CRAN.R-project.org/package=digest},
##   }
## 
## ATTENTION: This citation information has been auto-generated from the
## package DESCRIPTION file and may need manual editing, see
## 'help("citation")'.
## 
## 
## 
## 
## [[42]]
## 
## To cite package 'distributional' in publications use:
## 
##   O'Hara-Wild M, Kay M, Hayes A (2022). _distributional: Vectorised
##   Probability Distributions_. R package version 0.3.1,
##   <https://CRAN.R-project.org/package=distributional>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {distributional: Vectorised Probability Distributions},
##     author = {Mitchell O'Hara-Wild and Matthew Kay and Alex Hayes},
##     year = {2022},
##     note = {R package version 0.3.1},
##     url = {https://CRAN.R-project.org/package=distributional},
##   }
## 
## 
## 
## 
## [[43]]
## 
## To cite DMwR in publications use:
## 
##   Torgo, L. (2010). Data Mining with R, learning with case studies
##   Chapman and Hall/CRC. URL:
##   http://www.dcc.fc.up.pt/~ltorgo/DataMiningWithR
## 
## A BibTeX entry for LaTeX users is
## 
##   @Book{,
##     title = {Data Mining with R, learning with case studies},
##     author = {L. Torgo},
##     publisher = {Chapman and Hall/CRC},
##     year = {2010},
##     url = {http://www.dcc.fc.up.pt/~ltorgo/DataMiningWithR},
##   }
## 
## 
## [[44]]
## 
## To cite package 'dplyr' in publications use:
## 
##   Wickham H, François R, Henry L, Müller K, Vaughan D (2023). _dplyr: A
##   Grammar of Data Manipulation_. R package version 1.1.4,
##   <https://CRAN.R-project.org/package=dplyr>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {dplyr: A Grammar of Data Manipulation},
##     author = {Hadley Wickham and Romain François and Lionel Henry and Kirill Müller and Davis Vaughan},
##     year = {2023},
##     note = {R package version 1.1.4},
##     url = {https://CRAN.R-project.org/package=dplyr},
##   }
## 
## 
## 
## 
## [[45]]
## 
## To cite package 'DT' in publications use:
## 
##   Xie Y, Cheng J, Tan X (2023). _DT: A Wrapper of the JavaScript
##   Library 'DataTables'_. R package version 0.27,
##   <https://CRAN.R-project.org/package=DT>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {DT: A Wrapper of the JavaScript Library 'DataTables'},
##     author = {Yihui Xie and Joe Cheng and Xianying Tan},
##     year = {2023},
##     note = {R package version 0.27},
##     url = {https://CRAN.R-project.org/package=DT},
##   }
## 
## 
## 
## 
## [[46]]
## 
## To cite package 'e1071' in publications use:
## 
##   Meyer D, Dimitriadou E, Hornik K, Weingessel A, Leisch F (2023).
##   _e1071: Misc Functions of the Department of Statistics, Probability
##   Theory Group (Formerly: E1071), TU Wien_. R package version 1.7-13,
##   <https://CRAN.R-project.org/package=e1071>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {e1071: Misc Functions of the Department of Statistics, Probability
## Theory Group (Formerly: E1071), TU Wien},
##     author = {David Meyer and Evgenia Dimitriadou and Kurt Hornik and Andreas Weingessel and Friedrich Leisch},
##     year = {2023},
##     note = {R package version 1.7-13},
##     url = {https://CRAN.R-project.org/package=e1071},
##   }
## 
## 
## 
## 
## [[47]]
## 
## To cite effects in publications use:
## 
##   John Fox and Sanford Weisberg (2019). An R Companion to Applied
##   Regression, 3rd Edition. Thousand Oaks, CA
##   <https://socialsciences.mcmaster.ca/jfox/Books/Companion/index.html>
## 
## For predictor effects or partial residuals also cite:
## 
##   John Fox, Sanford Weisberg (2018). Visualizing Fit and Lack of Fit in
##   Complex Regression Models with Predictor Effect Plots and Partial
##   Residuals. Journal of Statistical Software, 87(9), 1-27. doi
##   10.18637/jss.v087.i09
## 
## For generalized linear models also cite:
## 
##   John Fox (2003). Effect Displays in R for Generalised Linear Models.
##   Journal of Statistical Software, 8(15), 1-27. doi
##   10.18637/jss.v008.i15
## 
## For usage in multinomial and proportional-odds logit models also cite:
## 
##   John Fox, Jangman Hong (2009). Effect Displays in R for Multinomial
##   and Proportional-Odds Logit Models: Extensions to the effects
##   Package. Journal of Statistical Software, 32(1), 1-24. doi
##   10.18637/jss.v032.i01
## 
## To see these entries in BibTeX format, use 'print(<citation>,
## bibtex=TRUE)', 'toBibtex(.)', or set
## 'options(citation.bibtex.max=999)'.
## 
## 
## [[48]]
## 
## To cite effectsize in publications use:
## 
##   Ben-Shachar M, Lüdecke D, Makowski D (2020). effectsize: Estimation
##   of Effect Size Indices and Standardized Parameters. Journal of Open
##   Source Software, 5(56), 2815. doi: 10.21105/joss.02815
## 
## A BibTeX entry for LaTeX users is
## 
##   @Article{,
##     title = {{e}ffectsize: Estimation of Effect Size Indices and Standardized Parameters},
##     author = {Mattan S. Ben-Shachar and Daniel Lüdecke and Dominique Makowski},
##     year = {2020},
##     journal = {Journal of Open Source Software},
##     volume = {5},
##     number = {56},
##     pages = {2815},
##     publisher = {The Open Journal},
##     doi = {10.21105/joss.02815},
##     url = {https://doi.org/10.21105/joss.02815},
##   }
## 
## 
## [[49]]
## 
## To cite in publications use:
## 
##   R. K. S. Hankin 2006. Introducing elliptic, an R package for elliptic
##   and modular functions. Journal of Statistical Software 15(7)
## 
## A BibTeX entry for LaTeX users is
## 
##   @Article{,
##     title = {Introducing elliptic, an R package for elliptic
##   and modular functions},
##     author = {Robin K.S. Hankin},
##     journal = {Journal of Statistical Software},
##     year = {2006},
##     month = {February},
##     volume = {15},
##     issue = {7},
##   }
## 
## 
## [[50]]
## 
## To cite package 'elsa' in publications use:
## 
##   Naimi B, Hamm NA, Groen TA, Skidmore AK, Toxopeus AG, Alibakhshi S
##   (2019). "ELSA: An Entropy-based Local indicator of Spatial
##   Association." _Spatial Statistics_, *29*, 66-88.
##   doi:10.1016/j.spasta.2018.10.001
##   <https://doi.org/10.1016/j.spasta.2018.10.001>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Article{,
##     title = {ELSA: An Entropy-based Local indicator of Spatial Association},
##     author = {Babak Naimi and Nicholas A. Hamm and Thomas A. Groen and Andrew K. Skidmore and Alberto G. Toxopeus and Sara Alibakhshi},
##     year = {2019},
##     journal = {Spatial Statistics},
##     volume = {29},
##     pages = {66-88},
##     doi = {10.1016/j.spasta.2018.10.001},
##   }
## 
## 
## [[51]]
## 
## To cite package 'EnvStats' in publications use:
## 
##   Millard SP (2013). _EnvStats: An R Package for Environmental
##   Statistics_. Springer, New York. ISBN 978-1-4614-8455-4,
##   <https://www.springer.com>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Book{EnvStats-book,
##     title = {EnvStats:  An R Package for Environmental Statistics},
##     author = {Steven P. Millard},
##     year = {2013},
##     publisher = {Springer},
##     address = {New York},
##     isbn = {978-1-4614-8455-4},
##     url = {https://www.springer.com},
##   }
## 
## 
## 
## 
## [[52]]
## 
## To cite etm in publications use:
## 
##   Arthur Allignol, Martin Schumacher, Jan Beyersmann (2011). Empirical
##   Transition Matrix of Multi-State Models: The etm Package. Journal of
##   Statistical Software, 38(4), 1-15. URL
##   https://www.jstatsoft.org/v38/i04/.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Article{,
##     title = {Empirical Transition Matrix of Multi-State Models: The {etm} Package},
##     author = {Arthur Allignol and Martin Schumacher and Jan Beyersmann},
##     journal = {Journal of Statistical Software},
##     year = {2011},
##     volume = {38},
##     number = {4},
##     pages = {1--15},
##     url = {https://www.jstatsoft.org/v38/i04/},
##   }
## 
## 
## [[53]]
## 
## To cite package 'evaluate' in publications use:
## 
##   Wickham H, Xie Y (2023). _evaluate: Parsing and Evaluation Tools that
##   Provide More Details than the Default_. R package version 0.23,
##   <https://CRAN.R-project.org/package=evaluate>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {evaluate: Parsing and Evaluation Tools that Provide More Details than the
## Default},
##     author = {Hadley Wickham and Yihui Xie},
##     year = {2023},
##     note = {R package version 0.23},
##     url = {https://CRAN.R-project.org/package=evaluate},
##   }
## 
## 
## 
## 
## [[54]]
## 
## To cite package 'expm' in publications use:
## 
##   Maechler M, Dutang C, Goulet V (2023). _expm: Matrix Exponential,
##   Log, 'etc'_. R package version 0.999-7,
##   <https://CRAN.R-project.org/package=expm>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {expm: Matrix Exponential, Log, 'etc'},
##     author = {Martin Maechler and Christophe Dutang and Vincent Goulet},
##     year = {2023},
##     note = {R package version 0.999-7},
##     url = {https://CRAN.R-project.org/package=expm},
##   }
## 
## 
## 
## 
## [[55]]
## 
## To cite package 'expsmooth' in publications use:
## 
##   Hyndman RJ (2015). _expsmooth: Data Sets from "Forecasting with
##   Exponential Smoothing"_. R package version 2.3,
##   <https://CRAN.R-project.org/package=expsmooth>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {expsmooth: Data Sets from "Forecasting with Exponential Smoothing"},
##     author = {Rob J Hyndman},
##     year = {2015},
##     note = {R package version 2.3},
##     url = {https://CRAN.R-project.org/package=expsmooth},
##   }
## 
## ATTENTION: This citation information has been auto-generated from the
## package DESCRIPTION file and may need manual editing, see
## 'help("citation")'.
## 
## 
## 
## 
## [[56]]
## 
## To cite package 'extrafont' in publications use:
## 
##   Chang W (2023). _extrafont: Tools for Using Fonts_. R package version
##   0.19, <https://CRAN.R-project.org/package=extrafont>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {extrafont: Tools for Using Fonts},
##     author = {Winston Chang},
##     year = {2023},
##     note = {R package version 0.19},
##     url = {https://CRAN.R-project.org/package=extrafont},
##   }
## 
## ATTENTION: This citation information has been auto-generated from the
## package DESCRIPTION file and may need manual editing, see
## 'help("citation")'.
## 
## 
## 
## 
## [[57]]
## 
## To cite package 'extrafontdb' in publications use:
## 
##   Chang W (2012). _extrafontdb: Package for holding the database for
##   the extrafont package_. R package version 1.0,
##   <https://CRAN.R-project.org/package=extrafontdb>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {extrafontdb: Package for holding the database for the extrafont package},
##     author = {Winston Chang},
##     year = {2012},
##     note = {R package version 1.0},
##     url = {https://CRAN.R-project.org/package=extrafontdb},
##   }
## 
## ATTENTION: This citation information has been auto-generated from the
## package DESCRIPTION file and may need manual editing, see
## 'help("citation")'.
## 
## 
## 
## 
## [[58]]
## 
## To cite package 'fable' in publications use:
## 
##   O'Hara-Wild M, Hyndman R, Wang E (2022). _fable: Forecasting Models
##   for Tidy Time Series_. R package version 0.3.2,
##   <https://CRAN.R-project.org/package=fable>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {fable: Forecasting Models for Tidy Time Series},
##     author = {Mitchell O'Hara-Wild and Rob Hyndman and Earo Wang},
##     year = {2022},
##     note = {R package version 0.3.2},
##     url = {https://CRAN.R-project.org/package=fable},
##   }
## 
## 
## 
## 
## [[59]]
## 
## To cite package 'fabletools' in publications use:
## 
##   O'Hara-Wild M, Hyndman R, Wang E (2021). _fabletools: Core Tools for
##   Packages in the 'fable' Framework_. R package version 0.3.2,
##   <https://CRAN.R-project.org/package=fabletools>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {fabletools: Core Tools for Packages in the 'fable' Framework},
##     author = {Mitchell O'Hara-Wild and Rob Hyndman and Earo Wang},
##     year = {2021},
##     note = {R package version 0.3.2},
##     url = {https://CRAN.R-project.org/package=fabletools},
##   }
## 
## 
## 
## 
## [[60]]
## 
## To cite package 'factoextra' in publications use:
## 
##   Kassambara A, Mundt F (2020). _factoextra: Extract and Visualize the
##   Results of Multivariate Data Analyses_. R package version 1.0.7,
##   <https://CRAN.R-project.org/package=factoextra>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {factoextra: Extract and Visualize the Results of Multivariate Data Analyses},
##     author = {Alboukadel Kassambara and Fabian Mundt},
##     year = {2020},
##     note = {R package version 1.0.7},
##     url = {https://CRAN.R-project.org/package=factoextra},
##   }
## 
## 
## 
## 
## [[61]]
## 
## To cite FactoMineR in publications use:
## 
##   Sebastien Le, Julie Josse, Francois Husson (2008). FactoMineR: An R
##   Package for Multivariate Analysis. Journal of Statistical Software,
##   25(1), 1-18. 10.18637/jss.v025.i01
## 
## A BibTeX entry for LaTeX users is
## 
##   @Article{,
##     title = {{FactoMineR}: A Package for Multivariate Analysis},
##     author = {S\'ebastien L\^e and Julie Josse and Fran\c{c}ois Husson},
##     journal = {Journal of Statistical Software},
##     year = {2008},
##     volume = {25},
##     number = {1},
##     pages = {1--18},
##     doi = {10.18637/jss.v025.i01},
##   }
## 
## 
## 
## 
## [[62]]
## 
## To cite package 'fansi' in publications use:
## 
##   Gaslam B (2023). _fansi: ANSI Control Sequence Aware String
##   Functions_. R package version 1.0.5,
##   <https://CRAN.R-project.org/package=fansi>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {fansi: ANSI Control Sequence Aware String Functions},
##     author = {Brodie Gaslam},
##     year = {2023},
##     note = {R package version 1.0.5},
##     url = {https://CRAN.R-project.org/package=fansi},
##   }
## 
## 
## 
## 
## [[63]]
## 
## To cite package 'faraway' in publications use:
## 
##   Faraway J (2022). _faraway: Functions and Datasets for Books by
##   Julian Faraway_. R package version 1.0.8,
##   <https://CRAN.R-project.org/package=faraway>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {faraway: Functions and Datasets for Books by Julian Faraway},
##     author = {Julian Faraway},
##     year = {2022},
##     note = {R package version 1.0.8},
##     url = {https://CRAN.R-project.org/package=faraway},
##   }
## 
## ATTENTION: This citation information has been auto-generated from the
## package DESCRIPTION file and may need manual editing, see
## 'help("citation")'.
## 
## 
## 
## 
## [[64]]
## 
## To cite package 'fastDummies' in publications use:
## 
##   Kaplan J (2020). _fastDummies: Fast Creation of Dummy (Binary)
##   Columns and Rows from Categorical Variables_. R package version
##   1.6.3, <https://CRAN.R-project.org/package=fastDummies>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {fastDummies: Fast Creation of Dummy (Binary) Columns and Rows from
## Categorical Variables},
##     author = {Jacob Kaplan},
##     year = {2020},
##     note = {R package version 1.6.3},
##     url = {https://CRAN.R-project.org/package=fastDummies},
##   }
## 
## 
## 
## 
## [[65]]
## 
## To cite package 'fastmap' in publications use:
## 
##   Chang W (2023). _fastmap: Fast Data Structures_. R package version
##   1.1.1, <https://CRAN.R-project.org/package=fastmap>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {fastmap: Fast Data Structures},
##     author = {Winston Chang},
##     year = {2023},
##     note = {R package version 1.1.1},
##     url = {https://CRAN.R-project.org/package=fastmap},
##   }
## 
## 
## 
## 
## [[66]]
## 
## To cite package 'fastmatch' in publications use:
## 
##   Urbanek S (2021). _fastmatch: Fast 'match()' Function_. R package
##   version 1.1-3, <https://CRAN.R-project.org/package=fastmatch>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {fastmatch: Fast 'match()' Function},
##     author = {Simon Urbanek},
##     year = {2021},
##     note = {R package version 1.1-3},
##     url = {https://CRAN.R-project.org/package=fastmatch},
##   }
## 
## ATTENTION: This citation information has been auto-generated from the
## package DESCRIPTION file and may need manual editing, see
## 'help("citation")'.
## 
## 
## 
## 
## [[67]]
## 
## To cite fastmatrix in publications use:
## 
##   Osorio, F., Ogueda, A. (2023). Fast computation of some matrices
##   useful in statistics. R package version 0.5. URL:
##   https://faosorios.github.io/fastmatrix/
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {Fast computation of some matrices useful in statistics},
##     author = {F. Osorio and A. Ogueda},
##     year = {2023},
##     note = {R package version 0.5},
##     url = {https://faosorios.github.io/fastmatrix/},
##   }
## 
## 
## [[68]]
## 
## To cite package 'feasts' in publications use:
## 
##   O'Hara-Wild M, Hyndman R, Wang E (2022). _feasts: Feature Extraction
##   and Statistics for Time Series_. R package version 0.3.0,
##   <https://CRAN.R-project.org/package=feasts>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {feasts: Feature Extraction and Statistics for Time Series},
##     author = {Mitchell O'Hara-Wild and Rob Hyndman and Earo Wang},
##     year = {2022},
##     note = {R package version 0.3.0},
##     url = {https://CRAN.R-project.org/package=feasts},
##   }
## 
## 
## 
## 
## [[69]]
## 
## To cite the fma package in publications, please use:
## 
##   Hyndman RJ (2023). _fma: Data sets from "Forecasting: methods and
##   applications" by Makridakis, Wheelwright & Hyndman (1998)_. R package
##   version 2.5, <http://pkg.robjhyndman.com/fma/>.
## 
##   Makridakis S, Wheelwright S, Hyndman RJ (1998). _Forecasting: methods
##   and applications_. John Wiley & Sons.
## 
## To see these entries in BibTeX format, use 'print(<citation>,
## bibtex=TRUE)', 'toBibtex(.)', or set
## 'options(citation.bibtex.max=999)'.
## 
## 
## [[70]]
## 
## To cite package 'fmsb' in publications use:
## 
##   Nakazawa M (2023). _fmsb: Functions for Medical Statistics Book with
##   some Demographic Data_. R package version 0.7.5,
##   <https://CRAN.R-project.org/package=fmsb>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {fmsb: Functions for Medical Statistics Book with some Demographic Data},
##     author = {Minato Nakazawa},
##     year = {2023},
##     note = {R package version 0.7.5},
##     url = {https://CRAN.R-project.org/package=fmsb},
##   }
## 
## ATTENTION: This citation information has been auto-generated from the
## package DESCRIPTION file and may need manual editing, see
## 'help("citation")'.
## 
## 
## 
## 
## [[71]]
## 
## To cite package 'fontawesome' in publications use:
## 
##   Iannone R (2023). _fontawesome: Easily Work with 'Font Awesome'
##   Icons_. R package version 0.5.1,
##   <https://CRAN.R-project.org/package=fontawesome>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {fontawesome: Easily Work with 'Font Awesome' Icons},
##     author = {Richard Iannone},
##     year = {2023},
##     note = {R package version 0.5.1},
##     url = {https://CRAN.R-project.org/package=fontawesome},
##   }
## 
## 
## 
## 
## [[72]]
## 
## To cite package 'forcats' in publications use:
## 
##   Wickham H (2023). _forcats: Tools for Working with Categorical
##   Variables (Factors)_. R package version 1.0.0,
##   <https://CRAN.R-project.org/package=forcats>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {forcats: Tools for Working with Categorical Variables (Factors)},
##     author = {Hadley Wickham},
##     year = {2023},
##     note = {R package version 1.0.0},
##     url = {https://CRAN.R-project.org/package=forcats},
##   }
## 
## 
## 
## 
## [[73]]
## 
## To cite the forecast package in publications, please use:
## 
##   Hyndman R, Athanasopoulos G, Bergmeir C, Caceres G, Chhay L,
##   O'Hara-Wild M, Petropoulos F, Razbash S, Wang E, Yasmeen F (2023).
##   _forecast: Forecasting functions for time series and linear models_.
##   R package version 8.21.1, <https://pkg.robjhyndman.com/forecast/>.
## 
##   Hyndman RJ, Khandakar Y (2008). "Automatic time series forecasting:
##   the forecast package for R." _Journal of Statistical Software_,
##   *26*(3), 1-22. doi:10.18637/jss.v027.i03
##   <https://doi.org/10.18637/jss.v027.i03>.
## 
## To see these entries in BibTeX format, use 'print(<citation>,
## bibtex=TRUE)', 'toBibtex(.)', or set
## 'options(citation.bibtex.max=999)'.
## 
## 
## [[74]]
## 
## To cite package 'fpp2' in publications use:
## 
##   Hyndman R (2023). _fpp2: Data for "Forecasting: Principles and
##   Practice" (2nd Edition)_. R package version 2.5,
##   <https://CRAN.R-project.org/package=fpp2>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {fpp2: Data for "Forecasting: Principles and Practice" (2nd Edition)},
##     author = {Rob Hyndman},
##     year = {2023},
##     note = {R package version 2.5},
##     url = {https://CRAN.R-project.org/package=fpp2},
##   }
## 
## 
## 
## 
## [[75]]
## 
## To cite package 'fpp3' in publications use:
## 
##   Hyndman R (2023). _fpp3: Data for "Forecasting: Principles and
##   Practice" (3rd Edition)_. R package version 0.5,
##   <https://CRAN.R-project.org/package=fpp3>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {fpp3: Data for "Forecasting: Principles and Practice" (3rd Edition)},
##     author = {Rob Hyndman},
##     year = {2023},
##     note = {R package version 0.5},
##     url = {https://CRAN.R-project.org/package=fpp3},
##   }
## 
## 
## 
## 
## [[76]]
## 
## To cite package 'fracdiff' in publications use:
## 
##   Maechler M (2022). _fracdiff: Fractionally Differenced ARIMA aka
##   ARFIMA(P,d,q) Models_. R package version 1.5-2,
##   <https://CRAN.R-project.org/package=fracdiff>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {fracdiff: Fractionally Differenced ARIMA aka ARFIMA(P,d,q) Models},
##     author = {Martin Maechler},
##     year = {2022},
##     note = {R package version 1.5-2},
##     url = {https://CRAN.R-project.org/package=fracdiff},
##   }
## 
## 
## 
## 
## [[77]]
## 
## To cite package 'fs' in publications use:
## 
##   Hester J, Wickham H, Csárdi G (2023). _fs: Cross-Platform File System
##   Operations Based on 'libuv'_. R package version 1.6.3,
##   <https://CRAN.R-project.org/package=fs>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {fs: Cross-Platform File System Operations Based on 'libuv'},
##     author = {Jim Hester and Hadley Wickham and Gábor Csárdi},
##     year = {2023},
##     note = {R package version 1.6.3},
##     url = {https://CRAN.R-project.org/package=fs},
##   }
## 
## 
## 
## 
## [[78]]
## 
## To cite package 'geojsonsf' in publications use:
## 
##   Cooley D (2022). _geojsonsf: GeoJSON to Simple Feature Converter_. R
##   package version 2.0.3,
##   <https://CRAN.R-project.org/package=geojsonsf>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {geojsonsf: GeoJSON to Simple Feature Converter},
##     author = {David Cooley},
##     year = {2022},
##     note = {R package version 2.0.3},
##     url = {https://CRAN.R-project.org/package=geojsonsf},
##   }
## 
## 
## 
## 
## [[79]]
## 
## To cite package 'geometries' in publications use:
## 
##   Cooley D (2023). _geometries: Convert Between R Objects and Geometric
##   Structures_. R package version 0.2.2,
##   <https://CRAN.R-project.org/package=geometries>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {geometries: Convert Between R Objects and Geometric Structures},
##     author = {David Cooley},
##     year = {2023},
##     note = {R package version 0.2.2},
##     url = {https://CRAN.R-project.org/package=geometries},
##   }
## 
## 
## 
## 
## [[80]]
## 
## To cite package 'gganimate' in publications use:
## 
##   Pedersen T, Robinson D (2022). _gganimate: A Grammar of Animated
##   Graphics_. R package version 1.0.8,
##   <https://CRAN.R-project.org/package=gganimate>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {gganimate: A Grammar of Animated Graphics},
##     author = {Thomas Lin Pedersen and David Robinson},
##     year = {2022},
##     note = {R package version 1.0.8},
##     url = {https://CRAN.R-project.org/package=gganimate},
##   }
## 
## 
## 
## 
## [[81]]
## 
## To cite package 'ggbiplot' in publications use:
## 
##   Vu VQ (2011). _ggbiplot: A ggplot2 based biplot_. R package version
##   0.55, <http://github.com/vqv/ggbiplot>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {ggbiplot: A ggplot2 based biplot},
##     author = {Vincent Q. Vu},
##     year = {2011},
##     note = {R package version 0.55},
##     url = {http://github.com/vqv/ggbiplot},
##   }
## 
## ATTENTION: This citation information has been auto-generated from the
## package DESCRIPTION file and may need manual editing, see
## 'help("citation")'.
## 
## 
## 
## 
## [[82]]
## 
## To cite package 'ggdag' in publications use:
## 
##   Barrett M (2023). _ggdag: Analyze and Create Elegant Directed Acyclic
##   Graphs_. R package version 0.2.10,
##   <https://CRAN.R-project.org/package=ggdag>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {ggdag: Analyze and Create Elegant Directed Acyclic Graphs},
##     author = {Malcolm Barrett},
##     year = {2023},
##     note = {R package version 0.2.10},
##     url = {https://CRAN.R-project.org/package=ggdag},
##   }
## 
## 
## 
## 
## [[83]]
## 
## To cite package 'ggdendro' in publications use:
## 
##   de Vries A, Ripley BD (2022). _ggdendro: Create Dendrograms and Tree
##   Diagrams Using 'ggplot2'_. R package version 0.1.23,
##   <https://CRAN.R-project.org/package=ggdendro>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {ggdendro: Create Dendrograms and Tree Diagrams Using 'ggplot2'},
##     author = {Andrie {de Vries} and Brian D. Ripley},
##     year = {2022},
##     note = {R package version 0.1.23},
##     url = {https://CRAN.R-project.org/package=ggdendro},
##   }
## 
## 
## 
## 
## [[84]]
## 
## To cite package 'ggeffects' in publications use:
## 
##   Lüdecke D (2018). "ggeffects: Tidy Data Frames of Marginal Effects
##   from Regression Models." _Journal of Open Source Software_, *3*(26),
##   772. doi:10.21105/joss.00772 <https://doi.org/10.21105/joss.00772>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Article{,
##     title = {ggeffects: Tidy Data Frames of Marginal Effects from Regression Models.},
##     volume = {3},
##     doi = {10.21105/joss.00772},
##     number = {26},
##     journal = {Journal of Open Source Software},
##     author = {Daniel Lüdecke},
##     year = {2018},
##     pages = {772},
##   }
## 
## 
## [[85]]
## 
## To cite package 'ggforce' in publications use:
## 
##   Pedersen T (2022). _ggforce: Accelerating 'ggplot2'_. R package
##   version 0.4.1, <https://CRAN.R-project.org/package=ggforce>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {ggforce: Accelerating 'ggplot2'},
##     author = {Thomas Lin Pedersen},
##     year = {2022},
##     note = {R package version 0.4.1},
##     url = {https://CRAN.R-project.org/package=ggforce},
##   }
## 
## 
## 
## 
## [[86]]
## 
## To cite package 'ggformula' in publications use:
## 
##   Kaplan D, Pruim R (2023). _ggformula: Formula Interface to the
##   Grammar of Graphics_. R package version 0.12.0,
##   <https://CRAN.R-project.org/package=ggformula>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {ggformula: Formula Interface to the Grammar of Graphics},
##     author = {Daniel Kaplan and Randall Pruim},
##     year = {2023},
##     note = {R package version 0.12.0},
##     url = {https://CRAN.R-project.org/package=ggformula},
##   }
## 
## 
## 
## 
## [[87]]
## 
## To cite package 'ggmap' in publications use:
## 
##   D. Kahle and H. Wickham. ggmap: Spatial Visualization with ggplot2.
##   The R Journal, 5(1), 144-161. URL
##   http://journal.r-project.org/archive/2013-1/kahle-wickham.pdf
## 
## A BibTeX entry for LaTeX users is
## 
##   @Article{,
##     author = {David Kahle and Hadley Wickham},
##     title = {ggmap: Spatial Visualization with ggplot2},
##     journal = {The R Journal},
##     year = {2013},
##     volume = {5},
##     number = {1},
##     pages = {144--161},
##     url = {https://journal.r-project.org/archive/2013-1/kahle-wickham.pdf},
##   }
## 
## 
## [[88]]
## 
## To cite ggplot2 in publications, please use
## 
##   H. Wickham. ggplot2: Elegant Graphics for Data Analysis.
##   Springer-Verlag New York, 2016.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Book{,
##     author = {Hadley Wickham},
##     title = {ggplot2: Elegant Graphics for Data Analysis},
##     publisher = {Springer-Verlag New York},
##     year = {2016},
##     isbn = {978-3-319-24277-4},
##     url = {https://ggplot2.tidyverse.org},
##   }
## 
## 
## 
## 
## [[89]]
## 
## To cite package 'ggprism' in publications use:
## 
##   Dawson C (2022). _ggprism: A 'ggplot2' Extension Inspired by
##   'GraphPad Prism'_. R package version 1.0.4,
##   <https://CRAN.R-project.org/package=ggprism>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {ggprism: A 'ggplot2' Extension Inspired by 'GraphPad Prism'},
##     author = {Charlotte Dawson},
##     year = {2022},
##     note = {R package version 1.0.4},
##     url = {https://CRAN.R-project.org/package=ggprism},
##   }
## 
## 
## 
## 
## [[90]]
## 
## To cite package 'ggraph' in publications use:
## 
##   Pedersen T (2022). _ggraph: An Implementation of Grammar of Graphics
##   for Graphs and Networks_. R package version 2.1.0,
##   <https://CRAN.R-project.org/package=ggraph>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {ggraph: An Implementation of Grammar of Graphics for Graphs and Networks},
##     author = {Thomas Lin Pedersen},
##     year = {2022},
##     note = {R package version 2.1.0},
##     url = {https://CRAN.R-project.org/package=ggraph},
##   }
## 
## 
## 
## 
## [[91]]
## 
## To cite package 'ggridges' in publications use:
## 
##   Wilke C (2022). _ggridges: Ridgeline Plots in 'ggplot2'_. R package
##   version 0.5.4, <https://CRAN.R-project.org/package=ggridges>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {ggridges: Ridgeline Plots in 'ggplot2'},
##     author = {Claus O. Wilke},
##     year = {2022},
##     note = {R package version 0.5.4},
##     url = {https://CRAN.R-project.org/package=ggridges},
##   }
## 
## 
## 
## 
## [[92]]
## 
## To cite package 'ggtext' in publications use:
## 
##   Wilke C, Wiernik B (2022). _ggtext: Improved Text Rendering Support
##   for 'ggplot2'_. R package version 0.1.2,
##   <https://CRAN.R-project.org/package=ggtext>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {ggtext: Improved Text Rendering Support for 'ggplot2'},
##     author = {Claus O. Wilke and Brenton M. Wiernik},
##     year = {2022},
##     note = {R package version 0.1.2},
##     url = {https://CRAN.R-project.org/package=ggtext},
##   }
## 
## 
## 
## 
## [[93]]
## 
## To cite package 'ggvoronoi' in publications use:
## 
##   Garrett R, Nar A, Fisher T (2022). _ggvoronoi: Voronoi Diagrams and
##   Heatmaps with 'ggplot2'_. R package version 0.8.5,
##   <https://CRAN.R-project.org/package=ggvoronoi>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {ggvoronoi: Voronoi Diagrams and Heatmaps with 'ggplot2'},
##     author = {Robert C. Garrett and Austin Nar and Thomas J. Fisher},
##     year = {2022},
##     note = {R package version 0.8.5},
##     url = {https://CRAN.R-project.org/package=ggvoronoi},
##   }
## 
## 
## 
## 
## [[94]]
## 
## To cite package 'gh' in publications use:
## 
##   Bryan J, Wickham H (2023). _gh: 'GitHub' 'API'_. R package version
##   1.4.0, <https://CRAN.R-project.org/package=gh>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {gh: 'GitHub' 'API'},
##     author = {Jennifer Bryan and Hadley Wickham},
##     year = {2023},
##     note = {R package version 1.4.0},
##     url = {https://CRAN.R-project.org/package=gh},
##   }
## 
## 
## 
## 
## [[95]]
## 
## To cite package 'glm2' in publications use:
## 
##   Marschner, I. C. (2011). glm2: Fitting generalized linear models with
##   convergence problems. The R Journal 3(2): 12-15
## 
## A BibTeX entry for LaTeX users is
## 
##   @Article{,
##     title = {{glm2}: Fitting generalized linear models with convergence problems},
##     journal = {The R Journal},
##     volume = {3},
##     part = {2},
##     pages = {12-15},
##     year = {2011},
##     author = {Ian C. Marschner},
##   }
## 
## Call citation("glm2", auto = TRUE) to obtain a reference to the package
## itself, and use toBibtex() to get the BibTeX entry for LaTeX users
## 
## 
## [[96]]
## 
## To cite package 'glmm' in publications use:
## 
##   Knudson C (2022). _glmm: Generalized Linear Mixed Models via Monte
##   Carlo Likelihood Approximation_. R package version 1.4.4,
##   <https://CRAN.R-project.org/package=glmm>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {glmm: Generalized Linear Mixed Models via Monte Carlo Likelihood
## Approximation},
##     author = {Christina Knudson},
##     year = {2022},
##     note = {R package version 1.4.4},
##     url = {https://CRAN.R-project.org/package=glmm},
##   }
## 
## 
## 
## 
## [[97]]
## 
## To cite package 'glmmML' in publications use:
## 
##   Broström G (2022). _glmmML: Generalized Linear Models with
##   Clustering_. R package version 1.1.4,
##   <https://CRAN.R-project.org/package=glmmML>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {glmmML: Generalized Linear Models with Clustering},
##     author = {Göran Broström},
##     year = {2022},
##     note = {R package version 1.1.4},
##     url = {https://CRAN.R-project.org/package=glmmML},
##   }
## 
## 
## 
## 
## [[98]]
## 
## To cite package 'glmpath' in publications use:
## 
##   Park MY, Hastie T (2018). _glmpath: L1 Regularization Path for
##   Generalized Linear Models and Cox Proportional Hazards Model_. R
##   package version 0.98, <https://CRAN.R-project.org/package=glmpath>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {glmpath: L1 Regularization Path for Generalized Linear Models and Cox
## Proportional Hazards Model},
##     author = {Mee Young Park and Trevor Hastie},
##     year = {2018},
##     note = {R package version 0.98},
##     url = {https://CRAN.R-project.org/package=glmpath},
##   }
## 
## ATTENTION: This citation information has been auto-generated from the
## package DESCRIPTION file and may need manual editing, see
## 'help("citation")'.
## 
## 
## 
## 
## [[99]]
## 
## To cite package 'GlobalOptions' in publications use:
## 
##   Gu Z (2020). _GlobalOptions: Generate Functions to Get or Set Global
##   Options_. R package version 0.1.2,
##   <https://CRAN.R-project.org/package=GlobalOptions>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {GlobalOptions: Generate Functions to Get or Set Global Options},
##     author = {Zuguang Gu},
##     year = {2020},
##     note = {R package version 0.1.2},
##     url = {https://CRAN.R-project.org/package=GlobalOptions},
##   }
## 
## ATTENTION: This citation information has been auto-generated from the
## package DESCRIPTION file and may need manual editing, see
## 'help("citation")'.
## 
## 
## 
## 
## [[100]]
## 
## To cite package 'gmp' in publications use:
## 
##   Lucas A, Scholz I, Boehme R, Jasson S, Maechler M (2023). _gmp:
##   Multiple Precision Arithmetic_. R package version 0.6-10,
##   <https://CRAN.R-project.org/package=gmp>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {gmp: Multiple Precision Arithmetic},
##     author = {Antoine Lucas and Immanuel Scholz and Rainer Boehme and Sylvain Jasson and Martin Maechler},
##     year = {2023},
##     note = {R package version 0.6-10},
##     url = {https://CRAN.R-project.org/package=gmp},
##   }
## 
## ATTENTION: This citation information has been auto-generated from the
## package DESCRIPTION file and may need manual editing, see
## 'help("citation")'.
## 
## 
## 
## 
## [[101]]
## 
## To cite package 'goftest' in publications use:
## 
##   Faraway J, Marsaglia G, Marsaglia J, Baddeley A (2021). _goftest:
##   Classical Goodness-of-Fit Tests for Univariate Distributions_. R
##   package version 1.2-3, <https://CRAN.R-project.org/package=goftest>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {goftest: Classical Goodness-of-Fit Tests for Univariate Distributions},
##     author = {Julian Faraway and George Marsaglia and John Marsaglia and Adrian Baddeley},
##     year = {2021},
##     note = {R package version 1.2-3},
##     url = {https://CRAN.R-project.org/package=goftest},
##   }
## 
## 
## 
## 
## [[102]]
## 
## To cite package 'gptstudio' in publications use:
## 
##   Nivard M, Wade J, Calderon S (2023). _gptstudio: Use Large Language
##   Models Directly in your Development Environment_. R package version
##   0.2.0, <https://CRAN.R-project.org/package=gptstudio>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {gptstudio: Use Large Language Models Directly in your Development
## Environment},
##     author = {Michel Nivard and James Wade and Samuel Calderon},
##     year = {2023},
##     note = {R package version 0.2.0},
##     url = {https://CRAN.R-project.org/package=gptstudio},
##   }
## 
## 
## 
## 
## [[103]]
## 
## To cite graphlayouts in publications use:
## 
##   Schoch, D., (2023). graphlayouts: Layout algorithms for network
##   visualizations in R. Journal of Open Source Software, 8(84), 5238,
##   https://doi.org/10.21105/joss.05238
## 
## A BibTeX entry for LaTeX users is
## 
##   @Article{,
##     author = {{David Schoch}},
##     title = {graphlayouts: Layout algorithms for network visualizations in R},
##     year = {2023},
##     publisher = {The Open Journal},
##     volume = {8},
##     number = {84},
##     pages = {5238},
##     journal = {Journal of Open Source Software},
##     doi = {10.21105/joss.05238},
##     url = {https://doi.org/10.21105/joss.05238},
##   }
## 
## 
## [[104]]
## 
## To cite package 'gridtext' in publications use:
## 
##   Wilke C, Wiernik B (2022). _gridtext: Improved Text Rendering Support
##   for 'Grid' Graphics_. R package version 0.1.5,
##   <https://CRAN.R-project.org/package=gridtext>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {gridtext: Improved Text Rendering Support for 'Grid' Graphics},
##     author = {Claus O. Wilke and Brenton M. Wiernik},
##     year = {2022},
##     note = {R package version 0.1.5},
##     url = {https://CRAN.R-project.org/package=gridtext},
##   }
## 
## 
## 
## 
## [[105]]
## 
## To cite package 'groupdata2' in publications use:
## 
##   Olsen L (2022). _groupdata2: Creating Groups from Data_. R package
##   version 2.0.2, <https://CRAN.R-project.org/package=groupdata2>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {groupdata2: Creating Groups from Data},
##     author = {Ludvig Renbo Olsen},
##     year = {2022},
##     note = {R package version 2.0.2},
##     url = {https://CRAN.R-project.org/package=groupdata2},
##   }
## 
## 
## 
## 
## [[106]]
## 
## To cite package 'gsubfn' in publications use:
## 
##   Grothendieck G (2018). _gsubfn: Utilities for Strings and Function
##   Arguments_. R package version 0.7,
##   <https://CRAN.R-project.org/package=gsubfn>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {gsubfn: Utilities for Strings and Function Arguments},
##     author = {G. Grothendieck},
##     year = {2018},
##     note = {R package version 0.7},
##     url = {https://CRAN.R-project.org/package=gsubfn},
##   }
## 
## ATTENTION: This citation information has been auto-generated from the
## package DESCRIPTION file and may need manual editing, see
## 'help("citation")'.
## 
## 
## 
## 
## [[107]]
## 
## To cite package 'gtable' in publications use:
## 
##   Wickham H, Pedersen T (2023). _gtable: Arrange 'Grobs' in Tables_. R
##   package version 0.3.4, <https://CRAN.R-project.org/package=gtable>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {gtable: Arrange 'Grobs' in Tables},
##     author = {Hadley Wickham and Thomas Lin Pedersen},
##     year = {2023},
##     note = {R package version 0.3.4},
##     url = {https://CRAN.R-project.org/package=gtable},
##   }
## 
## 
## 
## 
## [[108]]
## 
## To cite package 'gtools' in publications use:
## 
##   Bolker B, Warnes G, Lumley T (2022). _gtools: Various R Programming
##   Tools_. R package version 3.9.4,
##   <https://CRAN.R-project.org/package=gtools>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {gtools: Various R Programming Tools},
##     author = {Ben Bolker and Gregory R. Warnes and Thomas Lumley},
##     year = {2022},
##     note = {R package version 3.9.4},
##     url = {https://CRAN.R-project.org/package=gtools},
##   }
## 
## 
## 
## 
## [[109]]
## 
## To cite package 'haven' in publications use:
## 
##   Wickham H, Miller E, Smith D (2023). _haven: Import and Export
##   'SPSS', 'Stata' and 'SAS' Files_. R package version 2.5.3,
##   <https://CRAN.R-project.org/package=haven>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {haven: Import and Export 'SPSS', 'Stata' and 'SAS' Files},
##     author = {Hadley Wickham and Evan Miller and Danny Smith},
##     year = {2023},
##     note = {R package version 2.5.3},
##     url = {https://CRAN.R-project.org/package=haven},
##   }
## 
## 
## 
## 
## [[110]]
## 
## To cite package 'hexbin' in publications use:
## 
##   Carr D, Lewin-Koh pbN, Maechler M, Sarkar ccolfwbD (2023). _hexbin:
##   Hexagonal Binning Routines_. R package version 1.28.3,
##   <https://CRAN.R-project.org/package=hexbin>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {hexbin: Hexagonal Binning Routines},
##     author = {Dan Carr and ported by Nicholas Lewin-Koh and Martin Maechler and contains copies of lattice functions written by Deepayan Sarkar},
##     year = {2023},
##     note = {R package version 1.28.3},
##     url = {https://CRAN.R-project.org/package=hexbin},
##   }
## 
## ATTENTION: This citation information has been auto-generated from the
## package DESCRIPTION file and may need manual editing, see
## 'help("citation")'.
## 
## 
## 
## 
## [[111]]
## 
## To cite package 'hms' in publications use:
## 
##   Müller K (2023). _hms: Pretty Time of Day_. R package version 1.1.3,
##   <https://CRAN.R-project.org/package=hms>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {hms: Pretty Time of Day},
##     author = {Kirill Müller},
##     year = {2023},
##     note = {R package version 1.1.3},
##     url = {https://CRAN.R-project.org/package=hms},
##   }
## 
## 
## 
## 
## [[112]]
## 
## To cite package 'hrbrthemes' in publications use:
## 
##   Rudis B (2020). _hrbrthemes: Additional Themes, Theme Components and
##   Utilities for 'ggplot2'_. R package version 0.8.0,
##   <https://CRAN.R-project.org/package=hrbrthemes>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {hrbrthemes: Additional Themes, Theme Components and Utilities for 'ggplot2'},
##     author = {Bob Rudis},
##     year = {2020},
##     note = {R package version 0.8.0},
##     url = {https://CRAN.R-project.org/package=hrbrthemes},
##   }
## 
## 
## 
## 
## [[113]]
## 
## To cite package 'htmltools' in publications use:
## 
##   Cheng J, Sievert C, Schloerke B, Chang W, Xie Y, Allen J (2023).
##   _htmltools: Tools for HTML_. R package version 0.5.5,
##   <https://CRAN.R-project.org/package=htmltools>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {htmltools: Tools for HTML},
##     author = {Joe Cheng and Carson Sievert and Barret Schloerke and Winston Chang and Yihui Xie and Jeff Allen},
##     year = {2023},
##     note = {R package version 0.5.5},
##     url = {https://CRAN.R-project.org/package=htmltools},
##   }
## 
## 
## 
## 
## [[114]]
## 
## To cite package 'hts' in publications use:
## 
##   Hyndman R, Lee A, Wang E, Wickramasuriya S (2021). _hts: Hierarchical
##   and Grouped Time Series_. R package version 6.0.2,
##   <https://CRAN.R-project.org/package=hts>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {hts: Hierarchical and Grouped Time Series},
##     author = {Rob Hyndman and Alan Lee and Earo Wang and Shanika Wickramasuriya},
##     year = {2021},
##     note = {R package version 6.0.2},
##     url = {https://CRAN.R-project.org/package=hts},
##   }
## 
## 
## 
## 
## [[115]]
## 
## To cite package 'httpuv' in publications use:
## 
##   Cheng J, Chang W, Reid S, Brown J, Trower B, Peslyak A (2023).
##   _httpuv: HTTP and WebSocket Server Library_. R package version
##   1.6.11, <https://CRAN.R-project.org/package=httpuv>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {httpuv: HTTP and WebSocket Server Library},
##     author = {Joe Cheng and Winston Chang and Steve Reid and James Brown and Bob Trower and Alexander Peslyak},
##     year = {2023},
##     note = {R package version 1.6.11},
##     url = {https://CRAN.R-project.org/package=httpuv},
##   }
## 
## 
## 
## 
## [[116]]
## 
## To cite package 'httr' in publications use:
## 
##   Wickham H (2023). _httr: Tools for Working with URLs and HTTP_. R
##   package version 1.4.7, <https://CRAN.R-project.org/package=httr>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {httr: Tools for Working with URLs and HTTP},
##     author = {Hadley Wickham},
##     year = {2023},
##     note = {R package version 1.4.7},
##     url = {https://CRAN.R-project.org/package=httr},
##   }
## 
## 
## 
## 
## [[117]]
## 
## To cite package 'httr2' in publications use:
## 
##   Wickham H (2022). _httr2: Perform HTTP Requests and Process the
##   Responses_. R package version 0.2.2,
##   <https://CRAN.R-project.org/package=httr2>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {httr2: Perform HTTP Requests and Process the Responses},
##     author = {Hadley Wickham},
##     year = {2022},
##     note = {R package version 0.2.2},
##     url = {https://CRAN.R-project.org/package=httr2},
##   }
## 
## 
## 
## 
## [[118]]
## 
## To cite package 'hypergeo' in publications use:
## 
##   Hankin RKS (2016). _hypergeo: The Gauss Hypergeometric Function_. R
##   package version 1.2-13,
##   <https://CRAN.R-project.org/package=hypergeo>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {hypergeo: The Gauss Hypergeometric Function},
##     author = {Robin K. S. Hankin},
##     year = {2016},
##     note = {R package version 1.2-13},
##     url = {https://CRAN.R-project.org/package=hypergeo},
##   }
## 
## ATTENTION: This citation information has been auto-generated from the
## package DESCRIPTION file and may need manual editing, see
## 'help("citation")'.
## 
## 
## 
## 
## [[119]]
## 
## To cite 'igraph' in publications use:
## 
##   Csardi G, Nepusz T (2006). "The igraph software package for complex
##   network research." _InterJournal_, *Complex Systems*, 1695.
##   <https://igraph.org>.
## 
## Csárdi G, Nepusz T, Traag V, Horvát Sz, Zanini F, Noom D, Müller K
## (2023). _igraph: Network Analysis and Visualization in R_.
## doi:10.5281/zenodo.7682609 <https://doi.org/10.5281/zenodo.7682609>, R
## package version 1.5.1, <https://CRAN.R-project.org/package=igraph>.
## 
## To see these entries in BibTeX format, use 'print(<citation>,
## bibtex=TRUE)', 'toBibtex(.)', or set
## 'options(citation.bibtex.max=999)'.
## 
## 
## [[120]]
## 
## To cite package imbalance in publications use:
## 
##   Cordón I, García S, Fernández A, Herrera F (2018). "Imbalance:
##   Oversampling algorithms for imbalanced classification in R",
##   Knowledge-Based Systems, volume 161, pages 329-341
## 
## A BibTeX entry for LaTeX users is
## 
##   @Article{,
##     title = {Imbalance: Oversampling algorithms for imbalanced classification in R},
##     author = {Ignacio Cordón and Salvador García and Alberto Fernández and Francisco Herrera},
##     month = {12},
##     year = {2018},
##     pages = {329-341},
##     journal = {Knowledge-Based Systems},
##     volume = {161},
##     url = {https://doi.org/10.1016/j.knosys.2018.07.035},
##   }
## 
## 
## [[121]]
## 
## To cite the imputeTS package, use:
## 
##   Moritz S, Bartz-Beielstein T (2017). "imputeTS: Time Series Missing
##   Value Imputation in R." _The R Journal_, *9*(1), 207-218.
##   doi:10.32614/RJ-2017-009 <https://doi.org/10.32614/RJ-2017-009>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Article{,
##     title = {{imputeTS: Time Series Missing Value Imputation in R}},
##     author = {Steffen Moritz and Thomas Bartz-Beielstein},
##     journal = {{The R Journal}},
##     volume = {9},
##     number = {1},
##     pages = {207--218},
##     year = {2017},
##     doi = {10.32614/RJ-2017-009},
##   }
## 
## 
## [[122]]
## 
## To cite package 'inflection' in publications use:
## 
##   Christopoulos DT (2022). _inflection: Finds the Inflection Point of a
##   Curve_. R package version 1.3.6,
##   <https://CRAN.R-project.org/package=inflection>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {inflection: Finds the Inflection Point of a Curve},
##     author = {Demetris T. Christopoulos},
##     year = {2022},
##     note = {R package version 1.3.6},
##     url = {https://CRAN.R-project.org/package=inflection},
##   }
## 
## ATTENTION: This citation information has been auto-generated from the
## package DESCRIPTION file and may need manual editing, see
## 'help("citation")'.
## 
## 
## 
## 
## [[123]]
## 
## To cite package 'insight' in publications use:
## 
##   Lüdecke D, Waggoner P, Makowski D (2019). "insight: A Unified
##   Interface to Access Information from Model Objects in R." _Journal of
##   Open Source Software_, *4*(38), 1412. doi:10.21105/joss.01412
##   <https://doi.org/10.21105/joss.01412>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Article{,
##     title = {{insight}: A Unified Interface to Access Information from Model Objects in {R}.},
##     volume = {4},
##     doi = {10.21105/joss.01412},
##     number = {38},
##     journal = {Journal of Open Source Software},
##     author = {Daniel Lüdecke and Philip Waggoner and Dominique Makowski},
##     year = {2019},
##     pages = {1412},
##   }
## 
## 
## [[124]]
## 
## To cite package 'inum' in publications use:
## 
##   Hothorn T (2023). _inum: Interval and Enum-Type Representation of
##   Vectors_. R package version 1.0-5,
##   <https://CRAN.R-project.org/package=inum>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {inum: Interval and Enum-Type Representation of Vectors},
##     author = {Torsten Hothorn},
##     year = {2023},
##     note = {R package version 1.0-5},
##     url = {https://CRAN.R-project.org/package=inum},
##   }
## 
## 
## 
## 
## [[125]]
## 
## To cite package 'ipumsr' in publications use:
## 
##   Greg Freedman Ellis, Derek Burk (2022). _ipumsr: Read 'IPUMS' Extract
##   Files_. R package version 0.5.2,
##   <https://CRAN.R-project.org/package=ipumsr>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {ipumsr: Read 'IPUMS' Extract Files},
##     author = {{Greg Freedman Ellis} and {Derek Burk}},
##     year = {2022},
##     note = {R package version 0.5.2},
##     url = {https://CRAN.R-project.org/package=ipumsr},
##   }
## 
## 
## 
## 
## [[126]]
## 
## To cite package 'irlba' in publications use:
## 
##   Baglama J, Reichel L, Lewis B (2022). _irlba: Fast Truncated Singular
##   Value Decomposition and Principal Components Analysis for Large Dense
##   and Sparse Matrices_. R package version 2.3.5.1,
##   <https://CRAN.R-project.org/package=irlba>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {irlba: Fast Truncated Singular Value Decomposition and Principal
## Components Analysis for Large Dense and Sparse Matrices},
##     author = {Jim Baglama and Lothar Reichel and B. W. Lewis},
##     year = {2022},
##     note = {R package version 2.3.5.1},
##     url = {https://CRAN.R-project.org/package=irlba},
##   }
## 
## 
## 
## 
## [[127]]
## 
## To cite package 'ISLR2' in publications use:
## 
##   James G, Witten D, Hastie T, Tibshirani R (2022). _ISLR2:
##   Introduction to Statistical Learning, Second Edition_. R package
##   version 1.3-2, <https://CRAN.R-project.org/package=ISLR2>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {ISLR2: Introduction to Statistical Learning, Second Edition},
##     author = {Gareth James and Daniela Witten and Trevor Hastie and Rob Tibshirani},
##     year = {2022},
##     note = {R package version 1.3-2},
##     url = {https://CRAN.R-project.org/package=ISLR2},
##   }
## 
## 
## 
## 
## [[128]]
## 
## To cite package 'itertools' in publications use:
## 
##   Weston S, Wickham H (2014). _itertools: Iterator Tools_. R package
##   version 0.1-3, <https://CRAN.R-project.org/package=itertools>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {itertools: Iterator Tools},
##     author = {Steve Weston and Hadley Wickham},
##     year = {2014},
##     note = {R package version 0.1-3},
##     url = {https://CRAN.R-project.org/package=itertools},
##   }
## 
## ATTENTION: This citation information has been auto-generated from the
## package DESCRIPTION file and may need manual editing, see
## 'help("citation")'.
## 
## 
## 
## 
## [[129]]
## 
## To cite package 'ivmodel' in publications use:
## 
##   Kang H, Jiang Y, Zhao Q, Small D (2023). _ivmodel: Statistical
##   Inference and Sensitivity Analysis for Instrumental Variables Model_.
##   R package version 1.9.1,
##   <https://CRAN.R-project.org/package=ivmodel>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {ivmodel: Statistical Inference and Sensitivity Analysis for Instrumental
## Variables Model},
##     author = {Hyunseung Kang and Yang Jiang and Qingyuan Zhao and Dylan Small},
##     year = {2023},
##     note = {R package version 1.9.1},
##     url = {https://CRAN.R-project.org/package=ivmodel},
##   }
## 
## ATTENTION: This citation information has been auto-generated from the
## package DESCRIPTION file and may need manual editing, see
## 'help("citation")'.
## 
## 
## 
## 
## [[130]]
## 
## To cite package 'ivreg' in publications use:
## 
##   Fox J, Kleiber C, Zeileis A (2023). _ivreg: Instrumental-Variables
##   Regression by '2SLS', '2SM', or '2SMM', with Diagnostics_. R package
##   version 0.6-2, <https://CRAN.R-project.org/package=ivreg>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {ivreg: Instrumental-Variables Regression by '2SLS', '2SM', or '2SMM',
## with Diagnostics},
##     author = {John Fox and Christian Kleiber and Achim Zeileis},
##     year = {2023},
##     note = {R package version 0.6-2},
##     url = {https://CRAN.R-project.org/package=ivreg},
##   }
## 
## 
## 
## 
## [[131]]
## 
## To cite package 'jsonify' in publications use:
## 
##   Cooley D (2022). _jsonify: Convert Between 'R' Objects and Javascript
##   Object Notation (JSON)_. R package version 1.2.2,
##   <https://CRAN.R-project.org/package=jsonify>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {jsonify: Convert Between 'R' Objects and Javascript Object Notation
## (JSON)},
##     author = {David Cooley},
##     year = {2022},
##     note = {R package version 1.2.2},
##     url = {https://CRAN.R-project.org/package=jsonify},
##   }
## 
## 
## 
## 
## [[132]]
## 
## To cite jsonlite in publications use:
## 
##   Ooms J (2014). "The jsonlite Package: A Practical and Consistent
##   Mapping Between JSON Data and R Objects." _arXiv:1403.2805
##   [stat.CO]_. <https://arxiv.org/abs/1403.2805>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Article{,
##     title = {The jsonlite Package: A Practical and Consistent Mapping Between JSON Data and R Objects},
##     author = {Jeroen Ooms},
##     journal = {arXiv:1403.2805 [stat.CO]},
##     year = {2014},
##     url = {https://arxiv.org/abs/1403.2805},
##   }
## 
## 
## [[133]]
## 
## To cite package 'kableExtra' in publications use:
## 
##   Zhu H (2023). _kableExtra: Construct Complex Table with 'kable' and
##   Pipe Syntax_. http://haozhu233.github.io/kableExtra/,
##   https://github.com/haozhu233/kableExtra.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {kableExtra: Construct Complex Table with 'kable' and Pipe Syntax},
##     author = {Hao Zhu},
##     year = {2023},
##     note = {http://haozhu233.github.io/kableExtra/,
## https://github.com/haozhu233/kableExtra},
##   }
## 
## 
## 
## 
## [[134]]
## 
## Please cite the package in your publications:
## 
##   Mouselimis L (2023). _KernelKnn: Kernel k Nearest Neighbors_. R
##   package version 1.1.5,
##   <https://CRAN.R-project.org/package=KernelKnn>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {{KernelKnn}: Kernel k Nearest Neighbors},
##     author = {Lampros Mouselimis},
##     year = {2023},
##     note = {R package version 1.1.5},
##     url = {https://CRAN.R-project.org/package=KernelKnn},
##   }
## 
## 
## [[135]]
## 
## To cite package 'kimisc' in publications use:
## 
##   Müller K (2017). _kimisc: Kirill's Miscellaneous Functions_. R
##   package version 0.4, <https://CRAN.R-project.org/package=kimisc>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {kimisc: Kirill's Miscellaneous Functions},
##     author = {Kirill Müller},
##     year = {2017},
##     note = {R package version 0.4},
##     url = {https://CRAN.R-project.org/package=kimisc},
##   }
## 
## 
## 
## 
## [[136]]
## 
## To cite package 'ks' in publications use:
## 
##   Duong T (2022). _ks: Kernel Smoothing_. R package version 1.14.0,
##   <https://CRAN.R-project.org/package=ks>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {ks: Kernel Smoothing},
##     author = {Tarn Duong},
##     year = {2022},
##     note = {R package version 1.14.0},
##     url = {https://CRAN.R-project.org/package=ks},
##   }
## 
## 
## 
## 
## [[137]]
## 
## To cite package 'labeling' in publications use:
## 
##   Talbot, J (2023). _labeling: Axis Labeling_. R package version 0.4.3,
##   <https://CRAN.R-project.org/package=labeling>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {labeling: Axis Labeling},
##     author = {Justin Talbot,},
##     year = {2023},
##     note = {R package version 0.4.3},
##     url = {https://CRAN.R-project.org/package=labeling},
##   }
## 
## ATTENTION: This citation information has been auto-generated from the
## package DESCRIPTION file and may need manual editing, see
## 'help("citation")'.
## 
## 
## 
## 
## [[138]]
## 
## To cite package 'labelled' in publications use:
## 
##   Larmarange J (2023). _labelled: Manipulating Labelled Data_. R
##   package version 2.12.0,
##   <https://CRAN.R-project.org/package=labelled>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {labelled: Manipulating Labelled Data},
##     author = {Joseph Larmarange},
##     year = {2023},
##     note = {R package version 2.12.0},
##     url = {https://CRAN.R-project.org/package=labelled},
##   }
## 
## 
## 
## 
## [[139]]
## 
## To cite laeken in publications use:
## 
##   Andreas Alfons, Matthias Templ (2013). Estimation of Social Exclusion
##   Indicators from Complex Surveys: The R Package laeken. Journal of
##   Statistical Software, 54(15), 1-25. doi: 10.18637/jss.v054.i15.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Article{,
##     title = {Estimation of Social Exclusion Indicators from Complex Surveys: The {R} Package {laeken}},
##     author = {Andreas Alfons and Matthias Templ},
##     journal = {Journal of Statistical Software},
##     year = {2013},
##     volume = {54},
##     number = {15},
##     pages = {1--25},
##     doi = {10.18637/jss.v054.i15},
##   }
## 
## 
## [[140]]
## 
## To cite package 'languageserver' in publications use:
## 
##   Lai R (2023). _languageserver: Language Server Protocol_. R package
##   version 0.3.16, <https://CRAN.R-project.org/package=languageserver>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {languageserver: Language Server Protocol},
##     author = {Randy Lai},
##     year = {2023},
##     note = {R package version 0.3.16},
##     url = {https://CRAN.R-project.org/package=languageserver},
##   }
## 
## 
## 
## 
## [[141]]
## 
## To cite package 'lars' in publications use:
## 
##   Hastie T, Efron B (2022). _lars: Least Angle Regression, Lasso and
##   Forward Stagewise_. R package version 1.3,
##   <https://CRAN.R-project.org/package=lars>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {lars: Least Angle Regression, Lasso and Forward Stagewise},
##     author = {Trevor Hastie and Brad Efron},
##     year = {2022},
##     note = {R package version 1.3},
##     url = {https://CRAN.R-project.org/package=lars},
##   }
## 
## ATTENTION: This citation information has been auto-generated from the
## package DESCRIPTION file and may need manual editing, see
## 'help("citation")'.
## 
## 
## 
## 
## [[142]]
## 
## To cite package 'later' in publications use:
## 
##   Chang W, Cheng J (2023). _later: Utilities for Scheduling Functions
##   to Execute Later with Event Loops_. R package version 1.3.1,
##   <https://CRAN.R-project.org/package=later>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {later: Utilities for Scheduling Functions to Execute Later with Event
## Loops},
##     author = {Winston Chang and Joe Cheng},
##     year = {2023},
##     note = {R package version 1.3.1},
##     url = {https://CRAN.R-project.org/package=later},
##   }
## 
## 
## 
## 
## [[143]]
## 
## To cite package 'latexpdf' in publications use:
## 
##   Bergsma T (2021). _latexpdf: Convert Tables to PDF or PNG_. R package
##   version 0.1.7, <https://CRAN.R-project.org/package=latexpdf>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {latexpdf: Convert Tables to PDF or PNG},
##     author = {Tim Bergsma},
##     year = {2021},
##     note = {R package version 0.1.7},
##     url = {https://CRAN.R-project.org/package=latexpdf},
##   }
## 
## ATTENTION: This citation information has been auto-generated from the
## package DESCRIPTION file and may need manual editing, see
## 'help("citation")'.
## 
## 
## 
## 
## [[144]]
## 
## To cite lavaan in publications use:
## 
##   Yves Rosseel (2012). lavaan: An R Package for Structural Equation
##   Modeling. Journal of Statistical Software, 48(2), 1-36.
##   https://doi.org/10.18637/jss.v048.i02
## 
## A BibTeX entry for LaTeX users is
## 
##   @Article{,
##     title = {{lavaan}: An {R} Package for Structural Equation Modeling},
##     author = {Yves Rosseel},
##     journal = {Journal of Statistical Software},
##     year = {2012},
##     volume = {48},
##     number = {2},
##     pages = {1--36},
##     doi = {10.18637/jss.v048.i02},
##   }
## 
## 
## [[145]]
## 
## To cite package 'leafem' in publications use:
## 
##   Appelhans T (2022). _leafem: 'leaflet' Extensions for 'mapview'_. R
##   package version 0.2.0, <https://CRAN.R-project.org/package=leafem>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {leafem: 'leaflet' Extensions for 'mapview'},
##     author = {Tim Appelhans},
##     year = {2022},
##     note = {R package version 0.2.0},
##     url = {https://CRAN.R-project.org/package=leafem},
##   }
## 
## 
## 
## 
## [[146]]
## 
## To cite package 'leaflet' in publications use:
## 
##   Cheng J, Karambelkar B, Xie Y (2023). _leaflet: Create Interactive
##   Web Maps with the JavaScript 'Leaflet' Library_. R package version
##   2.1.2, <https://CRAN.R-project.org/package=leaflet>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {leaflet: Create Interactive Web Maps with the JavaScript 'Leaflet'
## Library},
##     author = {Joe Cheng and Bhaskar Karambelkar and Yihui Xie},
##     year = {2023},
##     note = {R package version 2.1.2},
##     url = {https://CRAN.R-project.org/package=leaflet},
##   }
## 
## 
## 
## 
## [[147]]
## 
## To cite package 'leaflet.extras' in publications use:
## 
##   Karambelkar B, Schloerke B (2018). _leaflet.extras: Extra
##   Functionality for 'leaflet' Package_. R package version 1.0.0,
##   <https://CRAN.R-project.org/package=leaflet.extras>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {leaflet.extras: Extra Functionality for 'leaflet' Package},
##     author = {Bhaskar Karambelkar and Barret Schloerke},
##     year = {2018},
##     note = {R package version 1.0.0},
##     url = {https://CRAN.R-project.org/package=leaflet.extras},
##   }
## 
## 
## 
## 
## [[148]]
## 
## To cite package 'leaflet.providers' in publications use:
## 
##   Huang L (2019). _leaflet.providers: Leaflet Providers_. R package
##   version 1.9.0,
##   <https://CRAN.R-project.org/package=leaflet.providers>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {leaflet.providers: Leaflet Providers},
##     author = {Leslie Huang},
##     year = {2019},
##     note = {R package version 1.9.0},
##     url = {https://CRAN.R-project.org/package=leaflet.providers},
##   }
## 
## 
## 
## 
## [[149]]
## 
## To cite package 'leafsync' in publications use:
## 
##   Appelhans T, Russell K (2019). _leafsync: Small Multiples for Leaflet
##   Web Maps_. R package version 0.1.0,
##   <https://CRAN.R-project.org/package=leafsync>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {leafsync: Small Multiples for Leaflet Web Maps},
##     author = {Tim Appelhans and Kenton Russell},
##     year = {2019},
##     note = {R package version 0.1.0},
##     url = {https://CRAN.R-project.org/package=leafsync},
##   }
## 
## 
## 
## 
## [[150]]
## 
## To cite package 'LearnBayes' in publications use:
## 
##   Albert J (2018). _LearnBayes: Functions for Learning Bayesian
##   Inference_. R package version 2.15.1,
##   <https://CRAN.R-project.org/package=LearnBayes>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {LearnBayes: Functions for Learning Bayesian Inference},
##     author = {Jim Albert},
##     year = {2018},
##     note = {R package version 2.15.1},
##     url = {https://CRAN.R-project.org/package=LearnBayes},
##   }
## 
## ATTENTION: This citation information has been auto-generated from the
## package DESCRIPTION file and may need manual editing, see
## 'help("citation")'.
## 
## 
## 
## 
## [[151]]
## 
## To cite package 'lifecycle' in publications use:
## 
##   Henry L, Wickham H (2023). _lifecycle: Manage the Life Cycle of your
##   Package Functions_. R package version 1.0.4,
##   <https://CRAN.R-project.org/package=lifecycle>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {lifecycle: Manage the Life Cycle of your Package Functions},
##     author = {Lionel Henry and Hadley Wickham},
##     year = {2023},
##     note = {R package version 1.0.4},
##     url = {https://CRAN.R-project.org/package=lifecycle},
##   }
## 
## 
## 
## 
## [[152]]
## 
## To cite lmtest in publications use:
## 
##   Achim Zeileis, Torsten Hothorn (2002). Diagnostic Checking in
##   Regression Relationships. R News 2(3), 7-10. URL
##   https://CRAN.R-project.org/doc/Rnews/
## 
## A BibTeX entry for LaTeX users is
## 
##   @Article{,
##     title = {Diagnostic Checking in Regression Relationships},
##     author = {Achim Zeileis and Torsten Hothorn},
##     journal = {R News},
##     year = {2002},
##     volume = {2},
##     number = {3},
##     pages = {7--10},
##     url = {https://CRAN.R-project.org/doc/Rnews/},
##   }
## 
## 
## [[153]]
## 
## To cite package 'lobstr' in publications use:
## 
##   Wickham H (2022). _lobstr: Visualize R Data Structures with Trees_. R
##   package version 1.1.2, <https://CRAN.R-project.org/package=lobstr>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {lobstr: Visualize R Data Structures with Trees},
##     author = {Hadley Wickham},
##     year = {2022},
##     note = {R package version 1.1.2},
##     url = {https://CRAN.R-project.org/package=lobstr},
##   }
## 
## 
## 
## 
## [[154]]
## 
## To cite package 'LST' in publications use:
## 
##   Kaplan D (2023). _LST: Software and data for Lessons in Statistical
##   Thinking_. R package version 0.3.1.9999,
##   <https://dtkaplan.github.io/LST/>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {LST: Software and data for Lessons in Statistical Thinking},
##     author = {Daniel Kaplan},
##     year = {2023},
##     note = {R package version 0.3.1.9999},
##     url = {https://dtkaplan.github.io/LST/},
##   }
## 
## 
## 
## 
## [[155]]
## 
## To cite lubridate in publications use:
## 
##   Garrett Grolemund, Hadley Wickham (2011). Dates and Times Made Easy
##   with lubridate. Journal of Statistical Software, 40(3), 1-25. URL
##   https://www.jstatsoft.org/v40/i03/.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Article{,
##     title = {Dates and Times Made Easy with {lubridate}},
##     author = {Garrett Grolemund and Hadley Wickham},
##     journal = {Journal of Statistical Software},
##     year = {2011},
##     volume = {40},
##     number = {3},
##     pages = {1--25},
##     url = {https://www.jstatsoft.org/v40/i03/},
##   }
## 
## 
## [[156]]
## 
## To cite in publications use:
## 
##   R. K. S. Hankin 2005. Recreational mathematics with R: introducing
##   the 'magic' package R News 5(1)
## 
## A BibTeX entry for LaTeX users is
## 
##   @Article{,
##     title = {Recreational mathematics with R: introducing the
##   'magic' package.},
##     author = {Robin K. S. Hankin},
##     journal = {R News},
##     year = {2005},
##     month = {May},
##     volume = {5},
##     issue = {1},
##   }
## 
## 
## [[157]]
## 
## To cite package 'magick' in publications use:
## 
##   Ooms J (2023). _magick: Advanced Graphics and Image-Processing in R_.
##   R package version 2.7.4, <https://CRAN.R-project.org/package=magick>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {magick: Advanced Graphics and Image-Processing in R},
##     author = {Jeroen Ooms},
##     year = {2023},
##     note = {R package version 2.7.4},
##     url = {https://CRAN.R-project.org/package=magick},
##   }
## 
## 
## 
## 
## [[158]]
## 
## To cite package 'maps' in publications use:
## 
##   Becker OScbRA, Minka ARWRvbRBEbTP, Deckmyn. A (2022). _maps: Draw
##   Geographical Maps_. R package version 3.4.1,
##   <https://CRAN.R-project.org/package=maps>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {maps: Draw Geographical Maps},
##     author = {Original S code by Richard A. Becker and Allan R. Wilks. R version by Ray Brownrigg. Enhancements by Thomas P Minka and Alex Deckmyn.},
##     year = {2022},
##     note = {R package version 3.4.1},
##     url = {https://CRAN.R-project.org/package=maps},
##   }
## 
## ATTENTION: This citation information has been auto-generated from the
## package DESCRIPTION file and may need manual editing, see
## 'help("citation")'.
## 
## 
## 
## 
## [[159]]
## 
## To cite the MASS package in publications use:
## 
##   Venables, W. N. & Ripley, B. D. (2002) Modern Applied Statistics with
##   S. Fourth Edition. Springer, New York. ISBN 0-387-95457-0
## 
## A BibTeX entry for LaTeX users is
## 
##   @Book{,
##     title = {Modern Applied Statistics with S},
##     author = {W. N. Venables and B. D. Ripley},
##     publisher = {Springer},
##     edition = {Fourth},
##     address = {New York},
##     year = {2002},
##     note = {ISBN 0-387-95457-0},
##     url = {https://www.stats.ox.ac.uk/pub/MASS4/},
##   }
## 
## 
## [[160]]
## 
## To cite package 'mathjaxr' in publications use:
## 
##   Viechtbauer W (2022). _mathjaxr: Using 'Mathjax' in Rd Files_. R
##   package version 1.6-0, <https://CRAN.R-project.org/package=mathjaxr>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {mathjaxr: Using 'Mathjax' in Rd Files},
##     author = {Wolfgang Viechtbauer},
##     year = {2022},
##     note = {R package version 1.6-0},
##     url = {https://CRAN.R-project.org/package=mathjaxr},
##   }
## 
## 
## 
## 
## [[161]]
## 
## To cite package 'Matrix' in publications use:
## 
##   Bates D, Maechler M, Jagan M (2022). _Matrix: Sparse and Dense Matrix
##   Classes and Methods_. R package version 1.5-3,
##   <https://CRAN.R-project.org/package=Matrix>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {Matrix: Sparse and Dense Matrix Classes and Methods},
##     author = {Douglas Bates and Martin Maechler and Mikael Jagan},
##     year = {2022},
##     note = {R package version 1.5-3},
##     url = {https://CRAN.R-project.org/package=Matrix},
##   }
## 
## 
## 
## 
## [[162]]
## 
## To cite 'mclust' R package in publications, please use:
## 
##   Scrucca L., Fop M., Murphy T. B. and Raftery A. E. (2016) mclust 5:
##   clustering, classification and density estimation using Gaussian
##   finite mixture models The R Journal 8/1, pp. 289-317
## 
## A BibTeX entry for LaTeX users is
## 
##   @Article{,
##     title = {{mclust} 5: clustering, classification and density estimation using {G}aussian finite mixture models},
##     author = {Luca Scrucca and Michael Fop and T. Brendan Murphy and Adrian E. Raftery},
##     journal = {The {R} Journal},
##     year = {2016},
##     volume = {8},
##     number = {1},
##     pages = {289--317},
##     url = {https://doi.org/10.32614/RJ-2016-021},
##   }
## 
## 
## [[163]]
## 
## To cite package 'Mcomp' in publications use:
## 
##   Hyndman R (2018). _Mcomp: Data from the M-Competitions_. R package
##   version 2.8, <https://CRAN.R-project.org/package=Mcomp>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {Mcomp: Data from the M-Competitions},
##     author = {Rob Hyndman},
##     year = {2018},
##     note = {R package version 2.8},
##     url = {https://CRAN.R-project.org/package=Mcomp},
##   }
## 
## 
## 
## 
## [[164]]
## 
## To cite package 'Metrics' in publications use:
## 
##   Hamner B, Frasco M (2018). _Metrics: Evaluation Metrics for Machine
##   Learning_. R package version 0.1.4,
##   <https://CRAN.R-project.org/package=Metrics>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {Metrics: Evaluation Metrics for Machine Learning},
##     author = {Ben Hamner and Michael Frasco},
##     year = {2018},
##     note = {R package version 0.1.4},
##     url = {https://CRAN.R-project.org/package=Metrics},
##   }
## 
## 
## 
## 
## [[165]]
## 
## To cite package 'minqa' in publications use:
## 
##   Bates D, Mullen KM, Nash JC, Varadhan R (2023). _minqa:
##   Derivative-Free Optimization Algorithms by Quadratic Approximation_.
##   R package version 1.2.6, <https://CRAN.R-project.org/package=minqa>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {minqa: Derivative-Free Optimization Algorithms by Quadratic
## Approximation},
##     author = {Douglas Bates and Katharine M. Mullen and John C. Nash and Ravi Varadhan},
##     year = {2023},
##     note = {R package version 1.2.6},
##     url = {https://CRAN.R-project.org/package=minqa},
##   }
## 
## ATTENTION: This citation information has been auto-generated from the
## package DESCRIPTION file and may need manual editing, see
## 'help("citation")'.
## 
## 
## 
## 
## [[166]]
## 
## To cite misc3d in publications use:
## 
##   Dai Feng, Luke Tierney (2008). Computing and Displaying Isosurfaces
##   in R. Journal of Statistical Software 28(1).
##   doi:10.18637/jss.v028.i01.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Article{,
##     title = {Computing and Displaying Isosurfaces in {R}},
##     author = {Dai Feng and Luke Tierney},
##     journal = {Journal of Statistical Software},
##     year = {2008},
##     volume = {28},
##     number = {1},
##     doi = {10.18637/jss.v028.i01},
##   }
## 
## 
## [[167]]
## 
## To cite package 'mitools' in publications use:
## 
##   Lumley T (2019). _mitools: Tools for Multiple Imputation of Missing
##   Data_. R package version 2.4,
##   <https://CRAN.R-project.org/package=mitools>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {mitools: Tools for Multiple Imputation of Missing Data},
##     author = {Thomas Lumley},
##     year = {2019},
##     note = {R package version 2.4},
##     url = {https://CRAN.R-project.org/package=mitools},
##   }
## 
## ATTENTION: This citation information has been auto-generated from the
## package DESCRIPTION file and may need manual editing, see
## 'help("citation")'.
## 
## 
## 
## 
## [[168]]
## 
## To cite mlogit in publications use:
## 
##   Croissant Y (2020). "Estimation of Random Utility Models in R: The
##   mlogit Package." _Journal of Statistical Software_, *95*(11), 1-41.
##   doi:10.18637/jss.v095.i11 <https://doi.org/10.18637/jss.v095.i11>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Article{,
##     title = {Estimation of Random Utility  Models in {R}: The {mlogit} Package},
##     author = {Yves Croissant},
##     journal = {Journal of Statistical Software},
##     year = {2020},
##     volume = {95},
##     number = {11},
##     pages = {1--41},
##     doi = {10.18637/jss.v095.i11},
##   }
## 
## 
## 
## 
## [[169]]
## 
## To cite package 'mlr' in publications use:
## 
##   Bischl B, Lang M, Kotthoff L, Schiffner J, Richter J, Studerus E,
##   Casalicchio G, Jones Z (2016). "mlr: Machine Learning in R." _Journal
##   of Machine Learning Research_, *17*(170), 1-5.
##   <https://jmlr.org/papers/v17/15-066.html>.
## 
##   Lang M, Kotthaus H, Marwedel P, Weihs C, Rahnenfuehrer J, Bischl B
##   (2014). "Automatic model selection for high-dimensional survival
##   analysis." _Journal of Statistical Computation and Simulation_,
##   *85*(1), 62-76.
## 
##   Bischl B, Kuehn T, Szepannek G (2016). "On Class Imbalance Correction
##   for Classification Algorithms in Credit Scoring." In _Operations
##   Research Proceedings 2014_, 37-43. Springer.
## 
##   Bischl B, Richter J, Bossek J, Horn D, Thomas J, Lang M (2017).
##   "mlrMBO: A Modular Framework for Model-Based Optimization of
##   Expensive Black-Box Functions." _arXiv preprint arXiv:1703.03373_.
## 
##   Probst P, Au Q, Casalicchio G, Stachl C, Bischl B (2017). "Multilabel
##   Classification with R Package mlr." _arXiv preprint
##   arXiv:1703.08991_.
## 
##   Casalicchio G, Bossek J, Lang M, Kirchhoff D, Kerschke P, Hofner B,
##   Seibold H, Vanschoren J, Bischl B (2017). "OpenML: An R package to
##   connect to the machine learning platform OpenML." _Computational
##   Statistics_, 1-15.
## 
## To see these entries in BibTeX format, use 'print(<citation>,
## bibtex=TRUE)', 'toBibtex(.)', or set
## 'options(citation.bibtex.max=999)'.
## 
## 
## [[170]]
## 
## To cite package 'moments' in publications use:
## 
##   Komsta L, Novomestky F (2022). _moments: Moments, Cumulants,
##   Skewness, Kurtosis and Related Tests_. R package version 0.14.1,
##   <https://CRAN.R-project.org/package=moments>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {moments: Moments, Cumulants, Skewness, Kurtosis and Related Tests},
##     author = {Lukasz Komsta and Frederick Novomestky},
##     year = {2022},
##     note = {R package version 0.14.1},
##     url = {https://CRAN.R-project.org/package=moments},
##   }
## 
## ATTENTION: This citation information has been auto-generated from the
## package DESCRIPTION file and may need manual editing, see
## 'help("citation")'.
## 
## 
## 
## 
## [[171]]
## 
## To cite mosaic in publications, please use:
## 
##   R. Pruim, D. T. Kaplan and N. J. Horton. The mosaic Package: Helping
##   Students to 'Think with Data' Using R (2017). The R Journal,
##   9(1):77-102.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Article{,
##     author = {Randall Pruim and Daniel T Kaplan and Nicholas J Horton},
##     title = {The mosaic Package: Helping Students to 'Think with Data' Using R},
##     journal = {The R Journal},
##     volume = {9},
##     number = {1},
##     pages = {77--102},
##     year = {2017},
##     url = {https://journal.r-project.org/archive/2017/RJ-2017-024/index.html},
##   }
## 
## 
## [[172]]
## 
## To cite package 'mosaicCore' in publications use:
## 
##   Pruim R, Kaplan DT, Horton NJ (2023). _mosaicCore: Common Utilities
##   for Other MOSAIC-Family Packages_. R package version 0.9.4.0,
##   <https://CRAN.R-project.org/package=mosaicCore>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {mosaicCore: Common Utilities for Other MOSAIC-Family Packages},
##     author = {Randall Pruim and Daniel T. Kaplan and Nicholas J. Horton},
##     year = {2023},
##     note = {R package version 0.9.4.0},
##     url = {https://CRAN.R-project.org/package=mosaicCore},
##   }
## 
## ATTENTION: This citation information has been auto-generated from the
## package DESCRIPTION file and may need manual editing, see
## 'help("citation")'.
## 
## 
## 
## 
## [[173]]
## 
## To cite package 'mosaicData' in publications use:
## 
##   Pruim R, Kaplan D, Horton N (2023). _mosaicData: Project MOSAIC Data
##   Sets_. R package version 0.20.4,
##   <https://CRAN.R-project.org/package=mosaicData>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {mosaicData: Project MOSAIC Data Sets},
##     author = {Randall Pruim and Daniel Kaplan and Nicholas Horton},
##     year = {2023},
##     note = {R package version 0.20.4},
##     url = {https://CRAN.R-project.org/package=mosaicData},
##   }
## 
## ATTENTION: This citation information has been auto-generated from the
## package DESCRIPTION file and may need manual editing, see
## 'help("citation")'.
## 
## 
## 
## 
## [[174]]
## 
## To cite package 'multicool' in publications use:
## 
##   Curran J, Williams A, Kelleher J, Barber D (2021). _multicool:
##   Permutations of Multisets in Cool-Lex Order_. R package version
##   0.1-12, <https://CRAN.R-project.org/package=multicool>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {multicool: Permutations of Multisets in Cool-Lex Order},
##     author = {James Curran and Aaron Williams and Jerome Kelleher and Dave Barber},
##     year = {2021},
##     note = {R package version 0.1-12},
##     url = {https://CRAN.R-project.org/package=multicool},
##   }
## 
## ATTENTION: This citation information has been auto-generated from the
## package DESCRIPTION file and may need manual editing, see
## 'help("citation")'.
## 
## 
## 
## 
## [[175]]
## 
## To cite package 'MuMIn' in publications use:
## 
##   Bartoń K (2023). _MuMIn: Multi-Model Inference_. R package version
##   1.47.5, <https://CRAN.R-project.org/package=MuMIn>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {MuMIn: Multi-Model Inference},
##     author = {Kamil Bartoń},
##     year = {2023},
##     note = {R package version 1.47.5},
##     url = {https://CRAN.R-project.org/package=MuMIn},
##   }
## 
## ATTENTION: This citation information has been auto-generated from the
## package DESCRIPTION file and may need manual editing, see
## 'help("citation")'.
## 
## 
## 
## 
## [[176]]
## 
## To cite package 'NCmisc' in publications use:
## 
##   Cooper N (2022). _NCmisc: Miscellaneous Functions for Creating
##   Adaptive Functions and Scripts_. R package version 1.2.0,
##   <https://CRAN.R-project.org/package=NCmisc>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {NCmisc: Miscellaneous Functions for Creating Adaptive Functions and
## Scripts},
##     author = {Nicholas Cooper},
##     year = {2022},
##     note = {R package version 1.2.0},
##     url = {https://CRAN.R-project.org/package=NCmisc},
##   }
## 
## ATTENTION: This citation information has been auto-generated from the
## package DESCRIPTION file and may need manual editing, see
## 'help("citation")'.
## 
## 
## 
## 
## [[177]]
## 
## To cite package 'networkD3' in publications use:
## 
##   Allaire J, Gandrud C, Russell K, Yetman C (2017). _networkD3: D3
##   JavaScript Network Graphs from R_. R package version 0.4,
##   <https://CRAN.R-project.org/package=networkD3>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {networkD3: D3 JavaScript Network Graphs from R},
##     author = {J.J. Allaire and Christopher Gandrud and Kenton Russell and CJ Yetman},
##     year = {2017},
##     note = {R package version 0.4},
##     url = {https://CRAN.R-project.org/package=networkD3},
##   }
## 
## 
## 
## 
## [[178]]
## 
## To cite package 'neuralnet' in publications use:
## 
##   Fritsch S, Guenther F, Wright M (2019). _neuralnet: Training of
##   Neural Networks_. R package version 1.44.2,
##   <https://CRAN.R-project.org/package=neuralnet>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {neuralnet: Training of Neural Networks},
##     author = {Stefan Fritsch and Frauke Guenther and Marvin N. Wright},
##     year = {2019},
##     note = {R package version 1.44.2},
##     url = {https://CRAN.R-project.org/package=neuralnet},
##   }
## 
## 
## 
## 
## [[179]]
## 
## To cite the nnet package in publications use:
## 
##   Venables, W. N. & Ripley, B. D. (2002) Modern Applied Statistics with
##   S. Fourth Edition. Springer, New York. ISBN 0-387-95457-0
## 
## A BibTeX entry for LaTeX users is
## 
##   @Book{,
##     title = {Modern Applied Statistics with S},
##     author = {W. N. Venables and B. D. Ripley},
##     publisher = {Springer},
##     edition = {Fourth},
##     address = {New York},
##     year = {2002},
##     note = {ISBN 0-387-95457-0},
##     url = {https://www.stats.ox.ac.uk/pub/MASS4/},
##   }
## 
## 
## [[180]]
## 
## To cite package 'nortest' in publications use:
## 
##   Gross J, Ligges U (2015). _nortest: Tests for Normality_. R package
##   version 1.0-4, <https://CRAN.R-project.org/package=nortest>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {nortest: Tests for Normality},
##     author = {Juergen Gross and Uwe Ligges},
##     year = {2015},
##     note = {R package version 1.0-4},
##     url = {https://CRAN.R-project.org/package=nortest},
##   }
## 
## 
## 
## 
## [[181]]
## 
## To cite package 'numbers' in publications use:
## 
##   Borchers HW (2022). _numbers: Number-Theoretic Functions_. R package
##   version 0.8-5, <https://CRAN.R-project.org/package=numbers>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {numbers: Number-Theoretic Functions},
##     author = {Hans Werner Borchers},
##     year = {2022},
##     note = {R package version 0.8-5},
##     url = {https://CRAN.R-project.org/package=numbers},
##   }
## 
## ATTENTION: This citation information has been auto-generated from the
## package DESCRIPTION file and may need manual editing, see
## 'help("citation")'.
## 
## 
## 
## 
## [[182]]
## 
## To cite package 'odbc' in publications use:
## 
##   Hester J, Wickham H, Gjoneski O (2023). _odbc: Connect to ODBC
##   Compatible Databases (using the DBI Interface)_. R package version
##   1.3.5, <https://CRAN.R-project.org/package=odbc>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {odbc: Connect to ODBC Compatible Databases (using the DBI Interface)},
##     author = {Jim Hester and Hadley Wickham and Oliver Gjoneski},
##     year = {2023},
##     note = {R package version 1.3.5},
##     url = {https://CRAN.R-project.org/package=odbc},
##   }
## 
## 
## 
## 
## [[183]]
## 
## To cite package 'OECD' in publications use:
## 
##   Persson E (2021). _OECD: Search and Extract Data from the OECD_. R
##   package version 0.2.5, <https://CRAN.R-project.org/package=OECD>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {OECD: Search and Extract Data from the OECD},
##     author = {Eric Persson},
##     year = {2021},
##     note = {R package version 0.2.5},
##     url = {https://CRAN.R-project.org/package=OECD},
##   }
## 
## 
## 
## 
## [[184]]
## 
## To cite package 'openssl' in publications use:
## 
##   Ooms J (2023). _openssl: Toolkit for Encryption, Signatures and
##   Certificates Based on OpenSSL_. R package version 2.0.6,
##   <https://CRAN.R-project.org/package=openssl>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {openssl: Toolkit for Encryption, Signatures and Certificates Based on
## OpenSSL},
##     author = {Jeroen Ooms},
##     year = {2023},
##     note = {R package version 2.0.6},
##     url = {https://CRAN.R-project.org/package=openssl},
##   }
## 
## 
## 
## 
## [[185]]
## 
## To cite package 'osqp' in publications use:
## 
##   Stellato B, Banjac G, Goulart P, Boyd S, Bansal V (2023). _osqp:
##   Quadratic Programming Solver using the 'OSQP' Library_. R package
##   version 0.6.0.8, <https://CRAN.R-project.org/package=osqp>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {osqp: Quadratic Programming Solver using the 'OSQP' Library},
##     author = {Bartolomeo Stellato and Goran Banjac and Paul Goulart and Stephen Boyd and Vineet Bansal},
##     year = {2023},
##     note = {R package version 0.6.0.8},
##     url = {https://CRAN.R-project.org/package=osqp},
##   }
## 
## 
## 
## 
## [[186]]
## 
## To cite pacman in publications, please use:
## 
##   Rinker, T. W. & Kurkiewicz, D. (2017). pacman: Package Management for
##   R. version 0.5.0. Buffalo, New York. http://github.com/trinker/pacman
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {{pacman}: {P}ackage Management for {R}},
##     author = {Tyler W. Rinker and Dason Kurkiewicz},
##     address = {Buffalo, New York},
##     note = {version 0.5.0},
##     year = {2018},
##     url = {http://github.com/trinker/pacman},
##   }
## 
## 
## [[187]]
## 
## To cite package 'padr' in publications use:
## 
##   Thoen E (2022). _padr: Quickly Get Datetime Data Ready for Analysis_.
##   R package version 0.6.2, <https://CRAN.R-project.org/package=padr>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {padr: Quickly Get Datetime Data Ready for Analysis},
##     author = {Edwin Thoen},
##     year = {2022},
##     note = {R package version 0.6.2},
##     url = {https://CRAN.R-project.org/package=padr},
##   }
## 
## ATTENTION: This citation information has been auto-generated from the
## package DESCRIPTION file and may need manual editing, see
## 'help("citation")'.
## 
## 
## 
## 
## [[188]]
## 
## To cite package 'pak' in publications use:
## 
##   Csárdi G, Hester J (2023). _pak: Another Approach to Package
##   Installation_. R package version 0.5.1,
##   <https://CRAN.R-project.org/package=pak>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {pak: Another Approach to Package Installation},
##     author = {Gábor Csárdi and Jim Hester},
##     year = {2023},
##     note = {R package version 0.5.1},
##     url = {https://CRAN.R-project.org/package=pak},
##   }
## 
## 
## 
## 
## [[189]]
## 
## To cite package 'pander' in publications use:
## 
##   Daróczi G, Tsegelskyi R (2022). _pander: An R 'Pandoc' Writer_. R
##   package version 0.6.5, <https://CRAN.R-project.org/package=pander>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {pander: An R 'Pandoc' Writer},
##     author = {Gergely Daróczi and Roman Tsegelskyi},
##     year = {2022},
##     note = {R package version 0.6.5},
##     url = {https://CRAN.R-project.org/package=pander},
##   }
## 
## 
## 
## 
## [[190]]
## 
## To cite package 'parallelMap' in publications use:
## 
##   Bischl B, Lang M, Schratz P (2021). _parallelMap: Unified Interface
##   to Parallelization Back-Ends_. R package version 1.5.1,
##   <https://CRAN.R-project.org/package=parallelMap>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {parallelMap: Unified Interface to Parallelization Back-Ends},
##     author = {Bernd Bischl and Michel Lang and Patrick Schratz},
##     year = {2021},
##     note = {R package version 1.5.1},
##     url = {https://CRAN.R-project.org/package=parallelMap},
##   }
## 
## 
## 
## 
## [[191]]
## 
## To cite package 'parameters' in publications use:
## 
##   Lüdecke D, Ben-Shachar M, Patil I, Makowski D (2020). "Extracting,
##   Computing and Exploring the Parameters of Statistical Models using
##   R." _Journal of Open Source Software_, *5*(53), 2445.
##   doi:10.21105/joss.02445 <https://doi.org/10.21105/joss.02445>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Article{,
##     title = {Extracting, Computing and Exploring the Parameters of Statistical Models using {R}.},
##     volume = {5},
##     doi = {10.21105/joss.02445},
##     number = {53},
##     journal = {Journal of Open Source Software},
##     author = {Daniel Lüdecke and Mattan S. Ben-Shachar and Indrajeet Patil and Dominique Makowski},
##     year = {2020},
##     pages = {2445},
##   }
## 
## 
## [[192]]
## 
## To cite package 'ParamHelpers' in publications use:
## 
##   Bischl B, Lang M, Richter J, Bossek J, Horn D, Kerschke P (2022).
##   _ParamHelpers: Helpers for Parameters in Black-Box Optimization,
##   Tuning and Machine Learning_. R package version 1.14.1,
##   <https://CRAN.R-project.org/package=ParamHelpers>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {ParamHelpers: Helpers for Parameters in Black-Box Optimization, Tuning and
## Machine Learning},
##     author = {Bernd Bischl and Michel Lang and Jakob Richter and Jakob Bossek and Daniel Horn and Pascal Kerschke},
##     year = {2022},
##     note = {R package version 1.14.1},
##     url = {https://CRAN.R-project.org/package=ParamHelpers},
##   }
## 
## 
## 
## 
## [[193]]
## 
## To cite in publications use:
## 
##   R. K. S. Hankin 2006. Additive integer partitions in R, Journal of
##   Statistical Software, Code Snippets 16(1)
## 
## A BibTeX entry for LaTeX users is
## 
##   @Article{,
##     title = {Additive integer partitions in R},
##     author = {R. K. S. Hankin},
##     journal = {Journal of Statistical Software, Code Snippets},
##     year = {2006},
##     month = {May},
##     volume = {16},
##     issue = {1},
##   }
## 
## 
## [[194]]
## 
## To cite package 'partykit' in publications use:
## 
##   Hothorn T, Zeileis A (2015). "partykit: A Modular Toolkit for
##   Recursive Partytioning in R." _Journal of Machine Learning Research_,
##   *16*, 3905-3909. <https://jmlr.org/papers/v16/hothorn15a.html>.
## 
##   Hothorn T, Hornik K, Zeileis A (2006). "Unbiased Recursive
##   Partitioning: A Conditional Inference Framework." _Journal of
##   Computational and Graphical Statistics_, *15*(3), 651-674.
##   doi:10.1198/106186006X133933
##   <https://doi.org/10.1198/106186006X133933>.
## 
##   Zeileis A, Hothorn T, Hornik K (2008). "Model-Based Recursive
##   Partitioning." _Journal of Computational and Graphical Statistics_,
##   *17*(2), 492-514. doi:10.1198/106186008X319331
##   <https://doi.org/10.1198/106186008X319331>.
## 
## To see these entries in BibTeX format, use 'print(<citation>,
## bibtex=TRUE)', 'toBibtex(.)', or set
## 'options(citation.bibtex.max=999)'.
## 
## 
## [[195]]
## 
## To cite package 'PCAmixdata' in publications use:
## 
##   Chavent M, Kuentz V, Labenne A, Liquet B, Saracco J (2017).
##   _PCAmixdata: Multivariate Analysis of Mixed Data_. R package version
##   3.1, <https://CRAN.R-project.org/package=PCAmixdata>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {PCAmixdata: Multivariate Analysis of Mixed Data},
##     author = {Marie Chavent and Vanessa Kuentz and Amaury Labenne and Benoit Liquet and Jerome Saracco},
##     year = {2017},
##     note = {R package version 3.1},
##     url = {https://CRAN.R-project.org/package=PCAmixdata},
##   }
## 
## 
## 
## 
## [[196]]
## 
## To cite package 'performance' in publications use:
## 
##   Lüdecke et al., (2021). performance: An R Package for Assessment,
##   Comparison and Testing of Statistical Models. Journal of Open Source
##   Software, 6(60), 3139. https://doi.org/10.21105/joss.03139
## 
## A BibTeX entry for LaTeX users is
## 
##   @Article{,
##     title = {{performance}: An {R} Package for Assessment, Comparison and Testing of Statistical Models},
##     author = {Daniel Lüdecke and Mattan S. Ben-Shachar and Indrajeet Patil and Philip Waggoner and Dominique Makowski},
##     year = {2021},
##     journal = {Journal of Open Source Software},
##     volume = {6},
##     number = {60},
##     pages = {3139},
##     doi = {10.21105/joss.03139},
##   }
## 
## 
## [[197]]
## 
## To cite performanceEstimation in publications use:
## 
##   Torgo, L. (2014). , An Infra-Structure for Performance Estimation and
##   Experimental Comparison of Predictive Models in R, CoRR abs/1412.0436
##   [cs.MS], URL: http://arxiv.org/abs/1412.0436
## 
## A BibTeX entry for LaTeX users is
## 
##   @Article{,
##     title = {An Infra-Structure for Performance Estimation and Experimental Comparison of Predictive Models in R},
##     author = {L. Torgo},
##     year = {2014},
##     ee = {http://arxiv.org/abs/1412.0436},
##     volume = {abs/1412.0436},
##     journal = {CoRR},
##   }
## 
## 
## [[198]]
## 
## To cite in publications use:
## 
##   R. K. S. Hankin 2020. Introducing the permutations package. SoftwareX
##   11)
## 
## A BibTeX entry for LaTeX users is
## 
##   @Article{,
##     title = {Introducing the permutations package},
##     author = {Robin K.S. Hankin},
##     journal = {SoftwareX},
##     year = {2020},
##     volume = {11},
##   }
## 
## 
## [[199]]
## 
## To cite package 'pillar' in publications use:
## 
##   Müller K, Wickham H (2023). _pillar: Coloured Formatting for
##   Columns_. R package version 1.9.0,
##   <https://CRAN.R-project.org/package=pillar>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {pillar: Coloured Formatting for Columns},
##     author = {Kirill Müller and Hadley Wickham},
##     year = {2023},
##     note = {R package version 1.9.0},
##     url = {https://CRAN.R-project.org/package=pillar},
##   }
## 
## 
## 
## 
## [[200]]
## 
## To cite package 'pkgbuild' in publications use:
## 
##   Wickham H, Hester J, Csárdi G (2023). _pkgbuild: Find Tools Needed to
##   Build R Packages_. R package version 1.4.2,
##   <https://CRAN.R-project.org/package=pkgbuild>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {pkgbuild: Find Tools Needed to Build R Packages},
##     author = {Hadley Wickham and Jim Hester and Gábor Csárdi},
##     year = {2023},
##     note = {R package version 1.4.2},
##     url = {https://CRAN.R-project.org/package=pkgbuild},
##   }
## 
## 
## 
## 
## [[201]]
## 
## To cite package 'pkgload' in publications use:
## 
##   Wickham H, Chang W, Hester J, Henry L (2023). _pkgload: Simulate
##   Package Installation and Attach_. R package version 1.3.3,
##   <https://CRAN.R-project.org/package=pkgload>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {pkgload: Simulate Package Installation and Attach},
##     author = {Hadley Wickham and Winston Chang and Jim Hester and Lionel Henry},
##     year = {2023},
##     note = {R package version 1.3.3},
##     url = {https://CRAN.R-project.org/package=pkgload},
##   }
## 
## 
## 
## 
## [[202]]
## 
## To cite package 'plogr' in publications use:
## 
##   Müller K (2018). _plogr: The 'plog' C++ Logging Library_. R package
##   version 0.2.0, <https://CRAN.R-project.org/package=plogr>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {plogr: The 'plog' C++ Logging Library},
##     author = {Kirill Müller},
##     year = {2018},
##     note = {R package version 0.2.0},
##     url = {https://CRAN.R-project.org/package=plogr},
##   }
## 
## 
## 
## 
## [[203]]
## 
## To cite package 'plot3D' in publications use:
## 
##   Soetaert K (2021). _plot3D: Plotting Multi-Dimensional Data_. R
##   package version 1.4, <https://CRAN.R-project.org/package=plot3D>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {plot3D: Plotting Multi-Dimensional Data},
##     author = {Karline Soetaert},
##     year = {2021},
##     note = {R package version 1.4},
##     url = {https://CRAN.R-project.org/package=plot3D},
##   }
## 
## ATTENTION: This citation information has been auto-generated from the
## package DESCRIPTION file and may need manual editing, see
## 'help("citation")'.
## 
## 
## 
## 
## [[204]]
## 
## To cite package 'polyclip' in publications use:
## 
##   Johnson A, Baddeley A (2022). _polyclip: Polygon Clipping_. R package
##   version 1.10-4, <https://CRAN.R-project.org/package=polyclip>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {polyclip: Polygon Clipping},
##     author = {Angus Johnson and Adrian Baddeley},
##     year = {2022},
##     note = {R package version 1.10-4},
##     url = {https://CRAN.R-project.org/package=polyclip},
##   }
## 
## 
## 
## 
## [[205]]
## 
## To cite package 'polyMatrix' in publications use:
## 
##   Prohle T, Prohle P, Ryzhkov N, Laszlo I (2021). _polyMatrix:
##   Infrastructure for Manipulation Polynomial Matrices_. R package
##   version 0.9.16, <https://CRAN.R-project.org/package=polyMatrix>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {polyMatrix: Infrastructure for Manipulation Polynomial Matrices},
##     author = {Tamas Prohle and Peter Prohle and Nikolai Ryzhkov and Ildiko Laszlo},
##     year = {2021},
##     note = {R package version 0.9.16},
##     url = {https://CRAN.R-project.org/package=polyMatrix},
##   }
## 
## 
## 
## 
## [[206]]
## 
## To cite package 'prettyunits' in publications use:
## 
##   Csardi G (2023). _prettyunits: Pretty, Human Readable Formatting of
##   Quantities_. R package version 1.2.0,
##   <https://CRAN.R-project.org/package=prettyunits>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {prettyunits: Pretty, Human Readable Formatting of Quantities},
##     author = {Gabor Csardi},
##     year = {2023},
##     note = {R package version 1.2.0},
##     url = {https://CRAN.R-project.org/package=prettyunits},
##   }
## 
## 
## 
## 
## [[207]]
## 
## If you use pROC in published research, please cite the following paper:
## 
##   Xavier Robin, Natacha Turck, Alexandre Hainard, Natalia Tiberti,
##   Frédérique Lisacek, Jean-Charles Sanchez and Markus Müller (2011).
##   pROC: an open-source package for R and S+ to analyze and compare ROC
##   curves. BMC Bioinformatics, 12, p. 77.  DOI: 10.1186/1471-2105-12-77
##   <http://www.biomedcentral.com/1471-2105/12/77/>
## 
## A BibTeX entry for LaTeX users is
## 
##   @Article{,
##     title = {pROC: an open-source package for R and S+ to analyze and compare ROC curves},
##     author = {Xavier Robin and Natacha Turck and Alexandre Hainard and Natalia Tiberti and Frédérique Lisacek and Jean-Charles Sanchez and Markus Müller},
##     year = {2011},
##     journal = {BMC Bioinformatics},
##     volume = {12},
##     pages = {77},
##   }
## 
## 
## [[208]]
## 
## To cite package 'processx' in publications use:
## 
##   Csárdi G, Chang W (2023). _processx: Execute and Control System
##   Processes_. R package version 3.8.2,
##   <https://CRAN.R-project.org/package=processx>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {processx: Execute and Control System Processes},
##     author = {Gábor Csárdi and Winston Chang},
##     year = {2023},
##     note = {R package version 3.8.2},
##     url = {https://CRAN.R-project.org/package=processx},
##   }
## 
## 
## 
## 
## [[209]]
## 
## To cite package 'proto' in publications use:
## 
##   Grothendieck G, Kates L, Petzoldt T (2016). _proto: Prototype
##   Object-Based Programming_. R package version 1.0.0,
##   <https://CRAN.R-project.org/package=proto>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {proto: Prototype Object-Based Programming},
##     author = {Gabor Grothendieck and Louis Kates and Thomas Petzoldt},
##     year = {2016},
##     note = {R package version 1.0.0},
##     url = {https://CRAN.R-project.org/package=proto},
##   }
## 
## 
## 
## 
## [[210]]
## 
## To cite package 'PRROC' in publications use:
## 
##   Jens Keilwagen, Ivo Grosse and Jan Grau (2014). Area under
##   Precision-Recall Curves for Weighted and Unweighted Data. PLOS ONE
##   (9) 3.
## 
##   Jan Grau, Ivo Grosse, and Jens Keilwagen (2015). PRROC: computing and
##   visualizing precision-recall and receiver operating characteristic
##   curves in R. Bioinformatics (31) 15, pp. 2595-2597.R package version
##   1.3.1.
## 
## To see these entries in BibTeX format, use 'print(<citation>,
## bibtex=TRUE)', 'toBibtex(.)', or set
## 'options(citation.bibtex.max=999)'.
## 
## 
## [[211]]
## 
## To cite package 'pryr' in publications use:
## 
##   Wickham H (2023). _pryr: Tools for Computing on the Language_. R
##   package version 0.1.6, <https://CRAN.R-project.org/package=pryr>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {pryr: Tools for Computing on the Language},
##     author = {Hadley Wickham},
##     year = {2023},
##     note = {R package version 0.1.6},
##     url = {https://CRAN.R-project.org/package=pryr},
##   }
## 
## 
## 
## 
## [[212]]
## 
## To cite package 'ps' in publications use:
## 
##   Loden J, Daeschler D, Rodola' G, Csárdi G (2023). _ps: List, Query,
##   Manipulate System Processes_. R package version 1.7.5,
##   <https://CRAN.R-project.org/package=ps>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {ps: List, Query, Manipulate System Processes},
##     author = {Jay Loden and Dave Daeschler and Giampaolo Rodola' and Gábor Csárdi},
##     year = {2023},
##     note = {R package version 1.7.5},
##     url = {https://CRAN.R-project.org/package=ps},
##   }
## 
## 
## 
## 
## [[213]]
## 
## To cite package 'psych' in publications use:
## 
##   William Revelle (2023). _psych: Procedures for Psychological,
##   Psychometric, and Personality Research_. Northwestern University,
##   Evanston, Illinois. R package version 2.3.6,
##   <https://CRAN.R-project.org/package=psych>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {psych: Procedures for Psychological, Psychometric, and Personality Research},
##     author = {{William Revelle}},
##     organization = {Northwestern University},
##     address = {Evanston, Illinois},
##     year = {2023},
##     note = {R package version 2.3.6},
##     url = {https://CRAN.R-project.org/package=psych},
##   }
## 
## 
## [[214]]
## 
## To cite package 'purrr' in publications use:
## 
##   Wickham H, Henry L (2023). _purrr: Functional Programming Tools_. R
##   package version 1.0.2, <https://CRAN.R-project.org/package=purrr>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {purrr: Functional Programming Tools},
##     author = {Hadley Wickham and Lionel Henry},
##     year = {2023},
##     note = {R package version 1.0.2},
##     url = {https://CRAN.R-project.org/package=purrr},
##   }
## 
## 
## 
## 
## [[215]]
## 
## To cite package 'quadprogXT' in publications use:
## 
##   Harlow B (2020). _quadprogXT: Quadratic Programming with Absolute
##   Value Constraints_. R package version 0.0.5,
##   <https://CRAN.R-project.org/package=quadprogXT>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {quadprogXT: Quadratic Programming with Absolute Value Constraints},
##     author = {Bob Harlow},
##     year = {2020},
##     note = {R package version 0.0.5},
##     url = {https://CRAN.R-project.org/package=quadprogXT},
##   }
## 
## 
## 
## 
## [[216]]
## 
## To cite package 'Quandl' in publications use:
## 
##   Raymond McTaggart, Gergely Daroczi, Clement Leung (2021). _Quandl:
##   API Wrapper for Quandl.com_. R package version 2.11.0,
##   <https://CRAN.R-project.org/package=Quandl>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {Quandl: API Wrapper for Quandl.com},
##     author = {{Raymond McTaggart} and {Gergely Daroczi} and {Clement Leung}},
##     year = {2021},
##     note = {R package version 2.11.0},
##     url = {https://CRAN.R-project.org/package=Quandl},
##   }
## 
## 
## 
## 
## [[217]]
## 
## To cite package 'quantmod' in publications use:
## 
##   Ryan JA, Ulrich JM (2023). _quantmod: Quantitative Financial
##   Modelling Framework_. R package version 0.4.25,
##   <https://CRAN.R-project.org/package=quantmod>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {quantmod: Quantitative Financial Modelling Framework},
##     author = {Jeffrey A. Ryan and Joshua M. Ulrich},
##     year = {2023},
##     note = {R package version 0.4.25},
##     url = {https://CRAN.R-project.org/package=quantmod},
##   }
## 
## 
## 
## 
## [[218]]
## 
## To cite package 'rapidjsonr' in publications use:
## 
##   Cooley D (2020). _rapidjsonr: 'Rapidjson' C++ Header Files_. R
##   package version 1.2.0,
##   <https://CRAN.R-project.org/package=rapidjsonr>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {rapidjsonr: 'Rapidjson' C++ Header Files},
##     author = {David Cooley},
##     year = {2020},
##     note = {R package version 1.2.0},
##     url = {https://CRAN.R-project.org/package=rapidjsonr},
##   }
## 
## 
## 
## 
## [[219]]
## 
## To cite package 'Rapport' in publications, please use:
## 
##   Blagotić, A. and Daróczi, G. (2022). Rapport: a report templating
##   system. R package version 1.1, URL
##   https://cran.r-project.org/package=rapport
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {Rapport: a report templating system},
##     author = {Aleksandar Blagotić and Gergely Daróczi},
##     year = {2022},
##     note = {R package version 1.1},
##     url = {https://cran.r-project.org/package=rapport},
##   }
## 
## 
## [[220]]
## 
## To cite package 'RConics' in publications use:
## 
##   Huber E (2022). _RConics: Computations on Conics_. R package version
##   1.1.1, <https://CRAN.R-project.org/package=RConics>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {RConics: Computations on Conics},
##     author = {Emanuel Huber},
##     year = {2022},
##     note = {R package version 1.1.1},
##     url = {https://CRAN.R-project.org/package=RConics},
##   }
## 
## 
## 
## 
## [[221]]
## 
## To cite package 'Rcpp' in publications use:
## 
##   Eddelbuettel D, Francois R, Allaire J, Ushey K, Kou Q, Russell N,
##   Ucar I, Bates D, Chambers J (2023). _Rcpp: Seamless R and C++
##   Integration_. R package version 1.0.11,
##   <https://CRAN.R-project.org/package=Rcpp>.
## 
##   Eddelbuettel D, François R (2011). "Rcpp: Seamless R and C++
##   Integration." _Journal of Statistical Software_, *40*(8), 1-18.
##   doi:10.18637/jss.v040.i08 <https://doi.org/10.18637/jss.v040.i08>.
## 
##   Eddelbuettel D (2013). _Seamless R and C++ Integration with Rcpp_.
##   Springer, New York. doi:10.1007/978-1-4614-6868-4
##   <https://doi.org/10.1007/978-1-4614-6868-4>, ISBN 978-1-4614-6867-7.
## 
##   Eddelbuettel D, Balamuta J (2018). "Extending R with C++: A Brief
##   Introduction to Rcpp." _The American Statistician_, *72*(1), 28-36.
##   doi:10.1080/00031305.2017.1375990
##   <https://doi.org/10.1080/00031305.2017.1375990>.
## 
## To see these entries in BibTeX format, use 'print(<citation>,
## bibtex=TRUE)', 'toBibtex(.)', or set
## 'options(citation.bibtex.max=999)'.
## 
## 
## [[222]]
## 
## To cite package 'RcppArmadillo' in publications use:
## 
##   Eddelbuettel D, Francois R, Bates D, Ni B, Sanderson C (2023).
##   _RcppArmadillo: 'Rcpp' Integration for the 'Armadillo' Templated
##   Linear Algebra Library_. R package version 0.12.6.4.0,
##   <https://CRAN.R-project.org/package=RcppArmadillo>.
## 
##   Eddelbuettel D, Sanderson C (2014). "RcppArmadillo: Accelerating R
##   with high-performance C++ linear algebra." _Computational Statistics
##   and Data Analysis_, *71*, 1054-1063. doi:10.1016/j.csda.2013.02.005
##   <https://doi.org/10.1016/j.csda.2013.02.005>.
## 
## To see these entries in BibTeX format, use 'print(<citation>,
## bibtex=TRUE)', 'toBibtex(.)', or set
## 'options(citation.bibtex.max=999)'.
## 
## 
## [[223]]
## 
## To cite package 'RcppGSL' in publications use:
## 
##   Eddelbuettel D, Francois R (2023). _RcppGSL: 'Rcpp' Integration for
##   'GNU GSL' Vectors and Matrices_. R package version 0.3.13,
##   <https://CRAN.R-project.org/package=RcppGSL>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {RcppGSL: 'Rcpp' Integration for 'GNU GSL' Vectors and Matrices},
##     author = {Dirk Eddelbuettel and Romain Francois},
##     year = {2023},
##     note = {R package version 0.3.13},
##     url = {https://CRAN.R-project.org/package=RcppGSL},
##   }
## 
## ATTENTION: This citation information has been auto-generated from the
## package DESCRIPTION file and may need manual editing, see
## 'help("citation")'.
## 
## 
## 
## 
## [[224]]
## 
## To cite package 'RcppRoll' in publications use:
## 
##   Ushey K (2018). _RcppRoll: Efficient Rolling / Windowed Operations_.
##   R package version 0.3.0,
##   <https://CRAN.R-project.org/package=RcppRoll>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {RcppRoll: Efficient Rolling / Windowed Operations},
##     author = {Kevin Ushey},
##     year = {2018},
##     note = {R package version 0.3.0},
##     url = {https://CRAN.R-project.org/package=RcppRoll},
##   }
## 
## ATTENTION: This citation information has been auto-generated from the
## package DESCRIPTION file and may need manual editing, see
## 'help("citation")'.
## 
## 
## 
## 
## [[225]]
## 
## To cite package 'RcppZiggurat' in publications use:
## 
##   Eddelbuettel D (2020). _RcppZiggurat: 'Rcpp' Integration of Different
##   "Ziggurat" Normal RNG Implementations_. R package version 0.1.6,
##   <https://CRAN.R-project.org/package=RcppZiggurat>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {RcppZiggurat: 'Rcpp' Integration of Different "Ziggurat" Normal RNG
## Implementations},
##     author = {Dirk Eddelbuettel},
##     year = {2020},
##     note = {R package version 0.1.6},
##     url = {https://CRAN.R-project.org/package=RcppZiggurat},
##   }
## 
## ATTENTION: This citation information has been auto-generated from the
## package DESCRIPTION file and may need manual editing, see
## 'help("citation")'.
## 
## 
## 
## 
## [[226]]
## 
## To cite package 'reader' in publications use:
## 
##   Cooper N (2017). _reader: Suite of Functions to Flexibly Read Data
##   from Files_. R package version 1.0.6,
##   <https://CRAN.R-project.org/package=reader>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {reader: Suite of Functions to Flexibly Read Data from Files},
##     author = {Nicholas Cooper},
##     year = {2017},
##     note = {R package version 1.0.6},
##     url = {https://CRAN.R-project.org/package=reader},
##   }
## 
## ATTENTION: This citation information has been auto-generated from the
## package DESCRIPTION file and may need manual editing, see
## 'help("citation")'.
## 
## 
## 
## 
## [[227]]
## 
## To cite package 'readr' in publications use:
## 
##   Wickham H, Hester J, Bryan J (2023). _readr: Read Rectangular Text
##   Data_. R package version 2.1.4,
##   <https://CRAN.R-project.org/package=readr>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {readr: Read Rectangular Text Data},
##     author = {Hadley Wickham and Jim Hester and Jennifer Bryan},
##     year = {2023},
##     note = {R package version 2.1.4},
##     url = {https://CRAN.R-project.org/package=readr},
##   }
## 
## 
## 
## 
## [[228]]
## 
## To cite package 'readxl' in publications use:
## 
##   Wickham H, Bryan J (2023). _readxl: Read Excel Files_. R package
##   version 1.4.3, <https://CRAN.R-project.org/package=readxl>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {readxl: Read Excel Files},
##     author = {Hadley Wickham and Jennifer Bryan},
##     year = {2023},
##     note = {R package version 1.4.3},
##     url = {https://CRAN.R-project.org/package=readxl},
##   }
## 
## 
## 
## 
## [[229]]
## 
## To cite package 'rearrr' in publications use:
## 
##   Olsen L (2023). _rearrr: Rearranging Data_. R package version 0.3.3,
##   <https://CRAN.R-project.org/package=rearrr>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {rearrr: Rearranging Data},
##     author = {Ludvig Renbo Olsen},
##     year = {2023},
##     note = {R package version 0.3.3},
##     url = {https://CRAN.R-project.org/package=rearrr},
##   }
## 
## 
## 
## 
## [[230]]
## 
## To cite package 'RefManageR' in publications use:
## 
##   McLean MW (2017). "RefManageR: Import and Manage BibTeX and BibLaTeX
##   References in R." _The Journal of Open Source Software_.
##   doi:10.21105/joss.00338 <https://doi.org/10.21105/joss.00338>.
## 
##   McLean MW (2014). _Straightforward Bibliography Management in R Using
##   the RefManager Package_. arXiv: 1403.2036 [cs.DL],
##   <https://arxiv.org/abs/1403.2036>.
## 
## To see these entries in BibTeX format, use 'print(<citation>,
## bibtex=TRUE)', 'toBibtex(.)', or set
## 'options(citation.bibtex.max=999)'.
## 
## 
## [[231]]
## 
## To cite package 'registry' in publications use:
## 
##   Meyer D (2019). _registry: Infrastructure for R Package Registries_.
##   R package version 0.5-1,
##   <https://CRAN.R-project.org/package=registry>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {registry: Infrastructure for R Package Registries},
##     author = {David Meyer},
##     year = {2019},
##     note = {R package version 0.5-1},
##     url = {https://CRAN.R-project.org/package=registry},
##   }
## 
## ATTENTION: This citation information has been auto-generated from the
## package DESCRIPTION file and may need manual editing, see
## 'help("citation")'.
## 
## 
## 
## 
## [[232]]
## 
## To cite package 'revealjs' in publications use:
## 
##   El Hattab H, Allaire J (2017). _revealjs: R Markdown Format for
##   'reveal.js' Presentations_. R package version 0.9,
##   <https://CRAN.R-project.org/package=revealjs>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {revealjs: R Markdown Format for 'reveal.js' Presentations},
##     author = {Hakim {El Hattab} and JJ Allaire},
##     year = {2017},
##     note = {R package version 0.9},
##     url = {https://CRAN.R-project.org/package=revealjs},
##   }
## 
## 
## 
## 
## [[233]]
## 
## To cite package 'Rfast' in publications use:
## 
##   Papadakis M, Tsagris M, Dimitriadis M, Fafalios S, Tsamardinos I,
##   Fasiolo M, Borboudakis G, Burkardt J, Zou C, Lakiotaki K,
##   Chatzipantsiou. C (2023). _Rfast: A Collection of Efficient and
##   Extremely Fast R Functions_. R package version 2.0.7,
##   <https://CRAN.R-project.org/package=Rfast>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {Rfast: A Collection of Efficient and Extremely Fast R Functions},
##     author = {Manos Papadakis and Michail Tsagris and Marios Dimitriadis and Stefanos Fafalios and Ioannis Tsamardinos and Matteo Fasiolo and Giorgos Borboudakis and John Burkardt and Changliang Zou and Kleanthi Lakiotaki and Christina Chatzipantsiou.},
##     year = {2023},
##     note = {R package version 2.0.7},
##     url = {https://CRAN.R-project.org/package=Rfast},
##   }
## 
## ATTENTION: This citation information has been auto-generated from the
## package DESCRIPTION file and may need manual editing, see
## 'help("citation")'.
## 
## 
## 
## 
## [[234]]
## 
## To cite package 'rgdal' in publications use:
## 
##   Bivand R, Keitt T, Rowlingson B (2023). _rgdal: Bindings for the
##   'Geospatial' Data Abstraction Library_. R package version 1.6-6,
##   <https://CRAN.R-project.org/package=rgdal>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {rgdal: Bindings for the 'Geospatial' Data Abstraction Library},
##     author = {Roger Bivand and Tim Keitt and Barry Rowlingson},
##     year = {2023},
##     note = {R package version 1.6-6},
##     url = {https://CRAN.R-project.org/package=rgdal},
##   }
## 
## 
## 
## 
## [[235]]
## 
## To cite package 'rgeos' in publications use:
## 
##   Bivand R, Rundel C (2023). _rgeos: Interface to Geometry Engine -
##   Open Source ('GEOS')_. R package version 0.6-2,
##   <https://CRAN.R-project.org/package=rgeos>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {rgeos: Interface to Geometry Engine - Open Source ('GEOS')},
##     author = {Roger Bivand and Colin Rundel},
##     year = {2023},
##     note = {R package version 0.6-2},
##     url = {https://CRAN.R-project.org/package=rgeos},
##   }
## 
## 
## 
## 
## [[236]]
## 
## To cite package 'RgoogleMaps' in publications use:
## 
##   Markus Loecher and Karl Ropkins (2015). RgoogleMaps and loa:
##   Unleashing R Graphics Power on Map Tiles. Journal of Statistical
##   Software 63(4), 1-18. URL http://www.jstatsoft.org/v63/i04/.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Article{,
##     title = {{RgoogleMaps} and {loa}: Unleashing {R} Graphics Power on Map Tiles},
##     author = {Markus Loecher and Karl Ropkins},
##     journal = {Journal of Statistical Software},
##     year = {2015},
##     volume = {63},
##     number = {4},
##     pages = {1--18},
##     url = {http://www.jstatsoft.org/v63/i04/},
##   }
## 
## 
## [[237]]
## 
## To cite package 'riingo' in publications use:
## 
##   Vaughan D, Dancho M (2020). _riingo: An R Interface to the 'Tiingo'
##   Stock Price API_. R package version 0.3.1,
##   <https://CRAN.R-project.org/package=riingo>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {riingo: An R Interface to the 'Tiingo' Stock Price API},
##     author = {Davis Vaughan and Matt Dancho},
##     year = {2020},
##     note = {R package version 0.3.1},
##     url = {https://CRAN.R-project.org/package=riingo},
##   }
## 
## 
## 
## 
## [[238]]
## 
## To cite package 'rjson' in publications use:
## 
##   Couture-Beil A (2022). _rjson: JSON for R_. R package version 0.2.21,
##   <https://CRAN.R-project.org/package=rjson>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {rjson: JSON for R},
##     author = {Alex Couture-Beil},
##     year = {2022},
##     note = {R package version 0.2.21},
##     url = {https://CRAN.R-project.org/package=rjson},
##   }
## 
## ATTENTION: This citation information has been auto-generated from the
## package DESCRIPTION file and may need manual editing, see
## 'help("citation")'.
## 
## 
## 
## 
## [[239]]
## 
## To cite package 'rlang' in publications use:
## 
##   Henry L, Wickham H (2023). _rlang: Functions for Base Types and Core
##   R and 'Tidyverse' Features_. R package version 1.1.2,
##   <https://CRAN.R-project.org/package=rlang>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {rlang: Functions for Base Types and Core R and 'Tidyverse' Features},
##     author = {Lionel Henry and Hadley Wickham},
##     year = {2023},
##     note = {R package version 1.1.2},
##     url = {https://CRAN.R-project.org/package=rlang},
##   }
## 
## 
## 
## 
## [[240]]
## 
## To cite package 'rmarkdown' in publications use:
## 
##   Allaire J, Xie Y, Dervieux C, McPherson J, Luraschi J, Ushey K,
##   Atkins A, Wickham H, Cheng J, Chang W, Iannone R (2023). _rmarkdown:
##   Dynamic Documents for R_. R package version 2.21,
##   <https://github.com/rstudio/rmarkdown>.
## 
##   Xie Y, Allaire J, Grolemund G (2018). _R Markdown: The Definitive
##   Guide_. Chapman and Hall/CRC, Boca Raton, Florida. ISBN
##   9781138359338, <https://bookdown.org/yihui/rmarkdown>.
## 
##   Xie Y, Dervieux C, Riederer E (2020). _R Markdown Cookbook_. Chapman
##   and Hall/CRC, Boca Raton, Florida. ISBN 9780367563837,
##   <https://bookdown.org/yihui/rmarkdown-cookbook>.
## 
## To see these entries in BibTeX format, use 'print(<citation>,
## bibtex=TRUE)', 'toBibtex(.)', or set
## 'options(citation.bibtex.max=999)'.
## 
## 
## [[241]]
## 
## To cite ROI in publications use:
## 
##   Theußl S, Schwendinger F, Hornik K (2020). "ROI: An Extensible R
##   Optimization Infrastructure." _Journal of Statistical Software_,
##   *94*(15), 1-64. doi:10.18637/jss.v094.i15
##   <https://doi.org/10.18637/jss.v094.i15>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Article{,
##     title = {{ROI}: An Extensible {R} Optimization Infrastructure},
##     author = {Stefan Theu{\ss}l and Florian Schwendinger and Kurt Hornik},
##     journal = {Journal of Statistical Software},
##     year = {2020},
##     volume = {94},
##     number = {15},
##     pages = {1--64},
##     doi = {10.18637/jss.v094.i15},
##   }
## 
## 
## 
## 
## [[242]]
## 
## To cite package 'ROI.plugin.qpoases' in publications use:
## 
##   Schwendinger F (2022). _ROI.plugin.qpoases: 'qpOASES' Plugin for the
##   'R' Optimization Infrastructure_. R package version 1.0-2,
##   <https://CRAN.R-project.org/package=ROI.plugin.qpoases>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {ROI.plugin.qpoases: 'qpOASES' Plugin for the 'R' Optimization Infrastructure},
##     author = {Florian Schwendinger},
##     year = {2022},
##     note = {R package version 1.0-2},
##     url = {https://CRAN.R-project.org/package=ROI.plugin.qpoases},
##   }
## 
## 
## 
## 
## [[243]]
## 
## To cite the ROSE package in publications use:
## 
##   Nicola Lunardon, Giovanna Menardi, and Nicola Torelli (2014). ROSE: a
##   Package for Binary Imbalanced Learning. R Journal, 6(1), 82-92.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Article{,
##     title = {{ROSE}: a {P}ackage for {B}inary {I}mbalanced {L}earning},
##     author = {Nicola Lunardon and Giovanna Menardi and Nicola Torelli},
##     journal = {{R} Journal},
##     year = {2014},
##     volume = {6},
##     number = {1},
##     pages = {82--92},
##   }
## 
## 
## [[244]]
## 
## To cite package 'rprojroot' in publications use:
## 
##   Müller K (2023). _rprojroot: Finding Files in Project
##   Subdirectories_. R package version 2.0.4,
##   <https://CRAN.R-project.org/package=rprojroot>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {rprojroot: Finding Files in Project Subdirectories},
##     author = {Kirill Müller},
##     year = {2023},
##     note = {R package version 2.0.4},
##     url = {https://CRAN.R-project.org/package=rprojroot},
##   }
## 
## 
## 
## 
## [[245]]
## 
## To cite package 'rsample' in publications use:
## 
##   Frick H, Chow F, Kuhn M, Mahoney M, Silge J, Wickham H (2023).
##   _rsample: General Resampling Infrastructure_. R package version
##   1.2.0, <https://CRAN.R-project.org/package=rsample>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {rsample: General Resampling Infrastructure},
##     author = {Hannah Frick and Fanny Chow and Max Kuhn and Michael Mahoney and Julia Silge and Hadley Wickham},
##     year = {2023},
##     note = {R package version 1.2.0},
##     url = {https://CRAN.R-project.org/package=rsample},
##   }
## 
## 
## 
## 
## [[246]]
## 
## To cite package 'RSQLite' in publications use:
## 
##   Müller K, Wickham H, James DA, Falcon S (2023). _RSQLite: SQLite
##   Interface for R_. R package version 2.3.1,
##   <https://CRAN.R-project.org/package=RSQLite>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {RSQLite: SQLite Interface for R},
##     author = {Kirill Müller and Hadley Wickham and David A. James and Seth Falcon},
##     year = {2023},
##     note = {R package version 2.3.1},
##     url = {https://CRAN.R-project.org/package=RSQLite},
##   }
## 
## 
## 
## 
## [[247]]
## 
## To cite package 'rticles' in publications use:
## 
##   Allaire J, Xie Y, Dervieux C, R Foundation, Wickham H, Journal of
##   Statistical Software, Vaidyanathan R, Association for Computing
##   Machinery, Boettiger C, Elsevier, Broman K, Mueller K, Quast B, Pruim
##   R, Marwick B, Wickham C, Keyes O, Yu M, Emaasit D, Onkelinx T,
##   Gasparini A, Desautels M, Leutnant D, MDPI, Taylor and Francis,
##   Öğreden O, Hance D, Nüst D, Uvesten P, Campitelli E, Muschelli J,
##   Hayes A, Kamvar Z, Ross N, Cannoodt R, Luguern D, Kaplan D, Kreutzer
##   S, Wang S, Hesselberth J, Hyndman R (2023). _rticles: Article Formats
##   for R Markdown_. R package version 0.24.13,
##   <https://github.com/rstudio/rticles>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {rticles: Article Formats for R Markdown},
##     author = {JJ Allaire and Yihui Xie and Christophe Dervieux and {R Foundation} and Hadley Wickham and {Journal of Statistical Software} and Ramnath  Vaidyanathan and {Association for Computing Machinery} and Carl Boettiger and {Elsevier} and Karl Broman and Kirill Mueller and Bastiaan Quast and Randall  Pruim and Ben Marwick and Charlotte Wickham and Oliver Keyes and Miao Yu and Daniel Emaasit and Thierry Onkelinx and Alessandro Gasparini and Marc-Andre Desautels and Dominik Leutnant and {MDPI} and {Taylor and Francis} and Oğuzhan Öğreden and Dalton Hance and Daniel Nüst and Petter Uvesten and Elio Campitelli and John Muschelli and Alex Hayes and Zhian N. Kamvar and Noam Ross and Robrecht Cannoodt and Duncan Luguern and David M. Kaplan and Sebastian Kreutzer and Shixiang Wang and Jay Hesselberth and Rob Hyndman},
##     year = {2023},
##     note = {R package version 0.24.13},
##     url = {https://github.com/rstudio/rticles},
##   }
## 
## 
## 
## 
## [[248]]
## 
## To cite package 'Rttf2pt1' in publications use:
## 
##   Chang W, Weeks A, Siegert FM, Heath M, Henlick T, Babkin S, Uyar T,
##   Hepas R, Tamas S, Vromans J, Titera P, Wang L, Xiangyang C, Petkovic
##   Z, Rigel, Hetherington IL (2023). _Rttf2pt1: 'ttf2pt1' Program_. R
##   package version 1.3.12,
##   <https://CRAN.R-project.org/package=Rttf2pt1>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {Rttf2pt1: 'ttf2pt1' Program},
##     author = {Winston Chang and Andrew Weeks and Frank M. Siegert and Mark Heath and Thomas Henlick and Sergey Babkin and Turgut Uyar and Rihardas Hepas and Szalay Tamas and Johan Vromans and Petr Titera and Lei Wang and Chen Xiangyang and Zvezdan Petkovic and {Rigel} and I. Lee Hetherington},
##     year = {2023},
##     note = {R package version 1.3.12},
##     url = {https://CRAN.R-project.org/package=Rttf2pt1},
##   }
## 
## ATTENTION: This citation information has been auto-generated from the
## package DESCRIPTION file and may need manual editing, see
## 'help("citation")'.
## 
## 
## 
## 
## [[249]]
## 
## To cite sampleSelection in publications use:
## 
##   Ott Toomet, Arne Henningsen (2008). Sample Selection Models in R:
##   Package sampleSelection. Journal of Statistical Software 27(7). URL
##   https://www.jstatsoft.org/v27/i07/.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Article{,
##     title = {Sample Selection Models in {R}: Package {sampleSelection}},
##     author = {Ott Toomet and Arne Henningsen},
##     journal = {Journal of Statistical Software},
##     year = {2008},
##     volume = {27},
##     number = {7},
##     url = {https://www.jstatsoft.org/v27/i07/},
##   }
## 
## 
## [[250]]
## 
## To cite package 'sass' in publications use:
## 
##   Cheng J, Mastny T, Iannone R, Schloerke B, Sievert C (2023). _sass:
##   Syntactically Awesome Style Sheets ('Sass')_. R package version
##   0.4.6, <https://CRAN.R-project.org/package=sass>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {sass: Syntactically Awesome Style Sheets ('Sass')},
##     author = {Joe Cheng and Timothy Mastny and Richard Iannone and Barret Schloerke and Carson Sievert},
##     year = {2023},
##     note = {R package version 0.4.6},
##     url = {https://CRAN.R-project.org/package=sass},
##   }
## 
## 
## 
## 
## [[251]]
## 
## To cite package 'sfheaders' in publications use:
## 
##   Cooley D (2023). _sfheaders: Converts Between R Objects and Simple
##   Feature Objects_. R package version 0.4.2,
##   <https://CRAN.R-project.org/package=sfheaders>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {sfheaders: Converts Between R Objects and Simple Feature Objects},
##     author = {David Cooley},
##     year = {2023},
##     note = {R package version 0.4.2},
##     url = {https://CRAN.R-project.org/package=sfheaders},
##   }
## 
## 
## 
## 
## [[252]]
## 
## To cite package 'shiny.i18n' in publications use:
## 
##   Nowicki J, Krzemiński D, Igras K, Sobolewski J (2023). _shiny.i18n:
##   Shiny Applications Internationalization_. R package version 0.3.0,
##   <https://CRAN.R-project.org/package=shiny.i18n>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {shiny.i18n: Shiny Applications Internationalization},
##     author = {Jakub Nowicki and Dominik Krzemiński and Krystian Igras and Jakub Sobolewski},
##     year = {2023},
##     note = {R package version 0.3.0},
##     url = {https://CRAN.R-project.org/package=shiny.i18n},
##   }
## 
## 
## 
## 
## [[253]]
## 
## To cite package 'sjmisc' in publications use:
## 
##   Lüdecke D (2018). "sjmisc: Data and Variable Transformation
##   Functions." _Journal of Open Source Software_, *3*(26), 754.
##   doi:10.21105/joss.00754 <https://doi.org/10.21105/joss.00754>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Article{,
##     title = {sjmisc: Data and Variable Transformation Functions.},
##     volume = {3},
##     doi = {10.21105/joss.00754},
##     number = {26},
##     journal = {Journal of Open Source Software},
##     author = {Daniel Lüdecke},
##     year = {2018},
##     pages = {754},
##   }
## 
## 
## [[254]]
## 
## To cite package 'sjPlot' in publications use:
## 
##   Lüdecke D (2023). _sjPlot: Data Visualization for Statistics in
##   Social Science_. R package version 2.8.15,
##   <https://CRAN.R-project.org/package=sjPlot>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {sjPlot: Data Visualization for Statistics in Social Science},
##     author = {Daniel Lüdecke},
##     year = {2023},
##     note = {R package version 2.8.15},
##     url = {https://CRAN.R-project.org/package=sjPlot},
##   }
## 
## 
## [[255]]
## 
## To cite package 'sjstats' in publications use:
## 
##   Lüdecke D (2022). _sjstats: Statistical Functions for Regression
##   Models (Version 0.18.2)_. doi:10.5281/zenodo.1284472
##   <https://doi.org/10.5281/zenodo.1284472>,
##   <https://CRAN.R-project.org/package=sjstats>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {sjstats: Statistical Functions for Regression Models (Version 0.18.2)},
##     author = {Daniel Lüdecke},
##     year = {2022},
##     url = {https://CRAN.R-project.org/package=sjstats},
##     doi = {10.5281/zenodo.1284472},
##   }
## 
## 
## [[256]]
## 
## To cite package in publications, please use:
## 
##   Farrar, Thomas J. (2020). skedastic: Heteroskedasticity Diagnostics
##   for Linear Regression Models. R Package version 1.0.0. University of
##   the Western Cape. Bellville, South Africa.
##   https://github.com/tjfarrar/skedastic
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {skedastic: Heteroskedasticity Diagnostics for Linear Regression Models},
##     author = {Thomas J. Farrar},
##     institution = {University of the Western  Cape},
##     address = {Bellville, South Africa},
##     year = {2020},
##     note = {R Package Version 1.0.0},
##     url = {https://github.com/tjfarrar/skedastic},
##   }
## 
## 
## [[257]]
## 
## To cite package 'smotefamily' in publications use:
## 
##   Siriseriwan W (2019). _smotefamily: A Collection of Oversampling
##   Techniques for Class Imbalance Problem Based on SMOTE_. R package
##   version 1.3.1, <https://CRAN.R-project.org/package=smotefamily>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {smotefamily: A Collection of Oversampling Techniques for Class Imbalance
## Problem Based on SMOTE},
##     author = {Wacharasak Siriseriwan},
##     year = {2019},
##     note = {R package version 1.3.1},
##     url = {https://CRAN.R-project.org/package=smotefamily},
##   }
## 
## 
## 
## 
## [[258]]
## 
## To cite package 'sourcetools' in publications use:
## 
##   Ushey K (2023). _sourcetools: Tools for Reading, Tokenizing and
##   Parsing R Code_. R package version 0.1.7-1,
##   <https://CRAN.R-project.org/package=sourcetools>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {sourcetools: Tools for Reading, Tokenizing and Parsing R Code},
##     author = {Kevin Ushey},
##     year = {2023},
##     note = {R package version 0.1.7-1},
##     url = {https://CRAN.R-project.org/package=sourcetools},
##   }
## 
## ATTENTION: This citation information has been auto-generated from the
## package DESCRIPTION file and may need manual editing, see
## 'help("citation")'.
## 
## 
## 
## 
## [[259]]
## 
## To cite spatialEco in publications use:
## 
##   Evans JS, Murphy MA (2021). _spatialEco_. R package version 1.3-6,
##   <https://github.com/jeffreyevans/spatialEco>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {spatialEco},
##     author = {Jeffrey S. Evans and Melanie A. Murphy},
##     year = {2021},
##     note = {R package version 1.3-6},
##     url = {https://github.com/jeffreyevans/spatialEco},
##     keywords = {spatialEco-package},
##   }
## 
## 
## [[260]]
## 
## To cite SpatialPack in publications use:
## 
##   Vallejos, R., Osorio, F., Bevilacqua, M. (2020). Spatial
##   Relationships Between Two Georeferenced Variables: with Applications
##   in R. Springer, New York. ISBN 978-3-030-56680-7
## 
## A BibTeX entry for LaTeX users is
## 
##   @Book{,
##     title = {Spatial Relationships Between Two Georeferenced Variables: with Applications in R},
##     author = {R. Vallejos and F. Osorio and M. Bevilacqua},
##     publisher = {Springer},
##     address = {New York},
##     year = {2020},
##     note = {ISBN 978-3-030-56680-7},
##     url = {http://srb2gv.mat.utfsm.cl/},
##   }
## 
## 
## [[261]]
## 
## To cite spatialreg in publications use one or more of the following as
## appropriate:
## 
##   Bivand R, Millo G, Piras G (2021). "A Review of Software for Spatial
##   Econometrics in R." _Mathematics_, *9*(11). doi:10.3390/math9111276
##   <https://doi.org/10.3390/math9111276>,
##   <https://www.mdpi.com/2227-7390/9/11/1276>.
## 
##   Bivand R, Piras G (2015). "Comparing Implementations of Estimation
##   Methods for Spatial Econometrics." _Journal of Statistical Software_,
##   *63*(18), 1-36. doi:10.18637/jss.v063.i18
##   <https://doi.org/10.18637/jss.v063.i18>.
## 
##   Bivand R, Hauke J, Kossowski T (2013). "Computing the Jacobian in
##   Gaussian spatial autoregressive models: An illustrated comparison of
##   available methods." _Geographical Analysis_, *45*(2), 150-179.
##   doi:10.1111/gean.12008 <https://doi.org/10.1111/gean.12008>.
## 
##   Bivand R, Pebesma E, Gómez-Rubio V (2013). _Applied spatial data
##   analysis with R, Second edition_. Springer, NY.
##   <https://asdar-book.org/>.
## 
##   Pebesma E, Bivand R (2023). _Spatial Data Science With Applications
##   in R_. Chapman & Hall. <https://r-spatial.org/book/>.
## 
## To see these entries in BibTeX format, use 'print(<citation>,
## bibtex=TRUE)', 'toBibtex(.)', or set
## 'options(citation.bibtex.max=999)'.
## 
## 
## [[262]]
## 
## To cite spatstat in publications, please use:
## 
##   Baddeley A, Rubak E, Turner R (2015). _Spatial Point Patterns:
##   Methodology and Applications with R_. Chapman and Hall/CRC Press,
##   London. ISBN 9781482210200,
##   <https://www.routledge.com/Spatial-Point-Patterns-Methodology-and-Applications-with-R/Baddeley-Rubak-Turner/p/book/9781482210200/>.
## 
## If you use hybrid models, please also cite:
## 
##   Baddeley A, Turner R, Mateu J, Bevan A (2013). "Hybrids of Gibbs
##   Point Process Models and Their Implementation." _Journal of
##   Statistical Software_, *55*(11), 1-43. doi:10.18637/jss.v055.i11
##   <https://doi.org/10.18637/jss.v055.i11>.
## 
## In survey articles, please also cite the original paper on spatstat:
## 
##   Baddeley A, Turner R (2005). "spatstat: An R Package for Analyzing
##   Spatial Point Patterns." _Journal of Statistical Software_, *12*(6),
##   1-42. doi:10.18637/jss.v012.i06
##   <https://doi.org/10.18637/jss.v012.i06>.
## 
## To see these entries in BibTeX format, use 'print(<citation>,
## bibtex=TRUE)', 'toBibtex(.)', or set
## 'options(citation.bibtex.max=999)'.
## 
## 
## [[263]]
## 
## To cite spatstat in publications, please use:
## 
##   Baddeley A, Rubak E, Turner R (2015). _Spatial Point Patterns:
##   Methodology and Applications with R_. Chapman and Hall/CRC Press,
##   London. ISBN 9781482210200,
##   <https://www.routledge.com/Spatial-Point-Patterns-Methodology-and-Applications-with-R/Baddeley-Rubak-Turner/p/book/9781482210200/>.
## 
## If you use hybrid models, please also cite:
## 
##   Baddeley A, Turner R, Mateu J, Bevan A (2013). "Hybrids of Gibbs
##   Point Process Models and Their Implementation." _Journal of
##   Statistical Software_, *55*(11), 1-43. doi:10.18637/jss.v055.i11
##   <https://doi.org/10.18637/jss.v055.i11>.
## 
## In survey articles, please also cite the original paper on spatstat:
## 
##   Baddeley A, Turner R (2005). "spatstat: An R Package for Analyzing
##   Spatial Point Patterns." _Journal of Statistical Software_, *12*(6),
##   1-42. doi:10.18637/jss.v012.i06
##   <https://doi.org/10.18637/jss.v012.i06>.
## 
## To see these entries in BibTeX format, use 'print(<citation>,
## bibtex=TRUE)', 'toBibtex(.)', or set
## 'options(citation.bibtex.max=999)'.
## 
## 
## [[264]]
## 
## To cite spatstat in publications, please use:
## 
##   Baddeley A, Rubak E, Turner R (2015). _Spatial Point Patterns:
##   Methodology and Applications with R_. Chapman and Hall/CRC Press,
##   London. ISBN 9781482210200,
##   <https://www.routledge.com/Spatial-Point-Patterns-Methodology-and-Applications-with-R/Baddeley-Rubak-Turner/p/book/9781482210200/>.
## 
## If you use hybrid models, please also cite:
## 
##   Baddeley A, Turner R, Mateu J, Bevan A (2013). "Hybrids of Gibbs
##   Point Process Models and Their Implementation." _Journal of
##   Statistical Software_, *55*(11), 1-43. doi:10.18637/jss.v055.i11
##   <https://doi.org/10.18637/jss.v055.i11>.
## 
## In survey articles, please also cite the original paper on spatstat:
## 
##   Baddeley A, Turner R (2005). "spatstat: An R Package for Analyzing
##   Spatial Point Patterns." _Journal of Statistical Software_, *12*(6),
##   1-42. doi:10.18637/jss.v012.i06
##   <https://doi.org/10.18637/jss.v012.i06>.
## 
## To see these entries in BibTeX format, use 'print(<citation>,
## bibtex=TRUE)', 'toBibtex(.)', or set
## 'options(citation.bibtex.max=999)'.
## 
## 
## [[265]]
## 
## To cite spatstat in publications, please use:
## 
##   Baddeley A, Rubak E, Turner R (2015). _Spatial Point Patterns:
##   Methodology and Applications with R_. Chapman and Hall/CRC Press,
##   London. ISBN 9781482210200,
##   <https://www.routledge.com/Spatial-Point-Patterns-Methodology-and-Applications-with-R/Baddeley-Rubak-Turner/p/book/9781482210200/>.
## 
## If you use hybrid models, please also cite:
## 
##   Baddeley A, Turner R, Mateu J, Bevan A (2013). "Hybrids of Gibbs
##   Point Process Models and Their Implementation." _Journal of
##   Statistical Software_, *55*(11), 1-43. doi:10.18637/jss.v055.i11
##   <https://doi.org/10.18637/jss.v055.i11>.
## 
## In survey articles, please also cite the original paper on spatstat:
## 
##   Baddeley A, Turner R (2005). "spatstat: An R Package for Analyzing
##   Spatial Point Patterns." _Journal of Statistical Software_, *12*(6),
##   1-42. doi:10.18637/jss.v012.i06
##   <https://doi.org/10.18637/jss.v012.i06>.
## 
## To see these entries in BibTeX format, use 'print(<citation>,
## bibtex=TRUE)', 'toBibtex(.)', or set
## 'options(citation.bibtex.max=999)'.
## 
## 
## [[266]]
## 
## To cite spatstat in publications, please use:
## 
##   Baddeley A, Rubak E, Turner R (2015). _Spatial Point Patterns:
##   Methodology and Applications with R_. Chapman and Hall/CRC Press,
##   London. ISBN 9781482210200,
##   <https://www.routledge.com/Spatial-Point-Patterns-Methodology-and-Applications-with-R/Baddeley-Rubak-Turner/p/book/9781482210200/>.
## 
## If you use hybrid models, please also cite:
## 
##   Baddeley A, Turner R, Mateu J, Bevan A (2013). "Hybrids of Gibbs
##   Point Process Models and Their Implementation." _Journal of
##   Statistical Software_, *55*(11), 1-43. doi:10.18637/jss.v055.i11
##   <https://doi.org/10.18637/jss.v055.i11>.
## 
## In survey articles, please also cite the original paper on spatstat:
## 
##   Baddeley A, Turner R (2005). "spatstat: An R Package for Analyzing
##   Spatial Point Patterns." _Journal of Statistical Software_, *12*(6),
##   1-42. doi:10.18637/jss.v012.i06
##   <https://doi.org/10.18637/jss.v012.i06>.
## 
## To see these entries in BibTeX format, use 'print(<citation>,
## bibtex=TRUE)', 'toBibtex(.)', or set
## 'options(citation.bibtex.max=999)'.
## 
## 
## [[267]]
## 
## To cite package 'spatstat.utils' in publications use:
## 
##   Baddeley A, Turner R, Rubak E (2023). _spatstat.utils: Utility
##   Functions for 'spatstat'_. R package version 3.0-3,
##   <https://CRAN.R-project.org/package=spatstat.utils>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {spatstat.utils: Utility Functions for 'spatstat'},
##     author = {Adrian Baddeley and Rolf Turner and Ege Rubak},
##     year = {2023},
##     note = {R package version 3.0-3},
##     url = {https://CRAN.R-project.org/package=spatstat.utils},
##   }
## 
## 
## 
## 
## [[268]]
## 
## To cite package 'spData' in publications use:
## 
##   Bivand R, Nowosad J, Lovelace R (2023). _spData: Datasets for Spatial
##   Analysis_. R package version 2.2.2,
##   <https://CRAN.R-project.org/package=spData>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {spData: Datasets for Spatial Analysis},
##     author = {Roger Bivand and Jakub Nowosad and Robin Lovelace},
##     year = {2023},
##     note = {R package version 2.2.2},
##     url = {https://CRAN.R-project.org/package=spData},
##   }
## 
## 
## 
## 
## [[269]]
## 
## To cite spdep in publications use one or more of the following as
## appropriate:
## 
##   Bivand R, Wong D (2018). "Comparing implementations of global and
##   local indicators of spatial association." _TEST_, *27*(3), 716-748.
##   doi:10.1007/s11749-018-0599-x
##   <https://doi.org/10.1007/s11749-018-0599-x>.
## 
##   Roger Bivand (2022). "R Packages for Analyzing Spatial Data: A
##   Comparative Case Study with Areal Data." _Geographical Analysis_,
##   *54*(3), 488-518. doi:10.1111/gean.12319
##   <https://doi.org/10.1111/gean.12319>.
## 
##   Bivand R, Pebesma E, Gómez-Rubio V (2013). _Applied spatial data
##   analysis with R, Second edition_. Springer, NY.
##   <https://asdar-book.org/>.
## 
##   Pebesma E, Bivand R (2023). _Spatial Data Science With Applications
##   in R_. Chapman & Hall. <https://r-spatial.org/book/>.
## 
## To see these entries in BibTeX format, use 'print(<citation>,
## bibtex=TRUE)', 'toBibtex(.)', or set
## 'options(citation.bibtex.max=999)'.
## 
## 
## [[270]]
## 
## To cite package 'sqldf' in publications use:
## 
##   Grothendieck G (2017). _sqldf: Manipulate R Data Frames Using SQL_. R
##   package version 0.4-11, <https://CRAN.R-project.org/package=sqldf>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {sqldf: Manipulate R Data Frames Using SQL},
##     author = {G. Grothendieck},
##     year = {2017},
##     note = {R package version 0.4-11},
##     url = {https://CRAN.R-project.org/package=sqldf},
##   }
## 
## ATTENTION: This citation information has been auto-generated from the
## package DESCRIPTION file and may need manual editing, see
## 'help("citation")'.
## 
## 
## 
## 
## [[271]]
## 
## Please cite stargazer in publications as:
## 
##   Hlavac, Marek (2022). stargazer: Well-Formatted Regression and
##   Summary Statistics Tables. R package version 5.2.3.
##   https://CRAN.R-project.org/package=stargazer
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {stargazer: Well-Formatted Regression and Summary Statistics Tables},
##     author = {Marek Hlavac},
##     year = {2022},
##     note = {R package version 5.2.3},
##     organization = {Social Policy Institute},
##     address = {Bratislava, Slovakia},
##     url = {https://CRAN.R-project.org/package=stargazer},
##   }
## 
## 
## [[272]]
## 
## To cite statmod in publications, please use the appropriate journal
## reference as given on the function help page. Usually this will be one
## of the following:
## 
##   Giner, G, and Smyth, GK (2016). statmod: probability calculations for
##   the inverse Gaussian distribution. R Journal 8(1), 339-351.
##   (pinvgauss, qinvgauss, dinvguass and rinvgauss functions)
## 
##   Phipson B, and Smyth GK (2010). Permutation p-values should never be
##   zero: calculating exact p-values when permutations are randomly
##   drawn. Statistical Applications in Genetics and Molecular Biology,
##   Volume 9, Issue 1, Article 39. (permp function)
## 
##   Hu, Y, and Smyth, GK (2009). ELDA: Extreme limiting dilution analysis
##   for comparing depleted and enriched populations in stem cell and
##   other assays. Journal of Immunological Methods 347, 70-78. (elda and
##   limdil functions)
## 
##   Smyth, G. K. (1998). Optimization and nonlinear equations. In:
##   Encyclopedia of Biostatistics, P. Armitage and T. Colton (eds.),
##   Wiley, London, pp. 3174-3180. (glmgam.fit, glmnb.fit and fitNBP
##   functions)
## 
##   Smyth, G. K. (1998). Numerical integration. In: Encyclopedia of
##   Biostatistics, P. Armitage and T. Colton (eds.), Wiley, London, pp.
##   3088-3095. (gauss.quad and gauss.quad.prob functions)
## 
##   Smyth, G. K. (2002). An efficient algorithm for REML in
##   heteroscedastic regression. Journal of Computational and Graphical
##   Statistics 11, 836-847. (remlscore, randomizedBlock, and mixedModel2
##   functions)
## 
##   Dunn, P. K., and Smyth, G. K. (1996). Randomized quantile residuals.
##   J. Comput. Graph. Statist., 5, 236-244. (qresid functions)
## 
## To see these entries in BibTeX format, use 'print(<citation>,
## bibtex=TRUE)', 'toBibtex(.)', or set
## 'options(citation.bibtex.max=999)'.
## 
## 
## [[273]]
## 
## To cite package 'stevedata' in publications use:
## 
##   Miller S (2023). _stevedata: Steve's Toy Data for Teaching About a
##   Variety of Methodological, Social, and Political Topics_. R package
##   version 1.1.0, <https://CRAN.R-project.org/package=stevedata>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {stevedata: Steve's Toy Data for Teaching About a Variety of Methodological,
## Social, and Political Topics},
##     author = {Steve Miller},
##     year = {2023},
##     note = {R package version 1.1.0},
##     url = {https://CRAN.R-project.org/package=stevedata},
##   }
## 
## 
## 
## 
## [[274]]
## 
## To cite package 'stinepack' in publications use:
## 
##   Bjornsson TJ&H, Grothendieck IMOG (2018). _stinepack: Stineman, a
##   Consistently Well Behaved Method of Interpolation_. R package version
##   1.4, <https://CRAN.R-project.org/package=stinepack>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {stinepack: Stineman, a Consistently Well Behaved Method of Interpolation},
##     author = {Tomas Johannesson & Halldor Bjornsson and Icelandic Met. Office; Gabor Grothendieck},
##     year = {2018},
##     note = {R package version 1.4},
##     url = {https://CRAN.R-project.org/package=stinepack},
##   }
## 
## ATTENTION: This citation information has been auto-generated from the
## package DESCRIPTION file and may need manual editing, see
## 'help("citation")'.
## 
## 
## 
## 
## [[275]]
## 
## To cite package 'stringdist' in publications use:
## 
##   van der Loo M (2014). "The stringdist package for approximate string
##   matching." _The R Journal_, *6*, 111-122.
##   <https://CRAN.R-project.org/package=stringdist>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Article{,
##     title = {The stringdist package for approximate string matching},
##     author = {M.P.J. {van der Loo}},
##     year = {2014},
##     journal = {The {R} {J}ournal},
##     volume = {6},
##     issue = {1},
##     url = {https://CRAN.R-project.org/package=stringdist},
##     pages = {111-122},
##   }
## 
## 
## [[276]]
## 
## To cite stringi in publications, use:
## 
##   Gagolewski M (2022). "stringi: Fast and portable character string
##   processing in R." _Journal of Statistical Software_, *103*(2), 1-59.
##   doi:10.18637/jss.v103.i02 <https://doi.org/10.18637/jss.v103.i02>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Article{,
##     title = {{stringi}: {F}ast and portable character string processing in {R}},
##     author = {Marek Gagolewski},
##     journal = {Journal of Statistical Software},
##     year = {2022},
##     volume = {103},
##     number = {2},
##     pages = {1--59},
##     doi = {10.18637/jss.v103.i02},
##   }
## 
## 
## 
## 
## [[277]]
## 
## To cite package 'stringr' in publications use:
## 
##   Wickham H (2023). _stringr: Simple, Consistent Wrappers for Common
##   String Operations_. R package version 1.5.1,
##   <https://CRAN.R-project.org/package=stringr>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {stringr: Simple, Consistent Wrappers for Common String Operations},
##     author = {Hadley Wickham},
##     year = {2023},
##     note = {R package version 1.5.1},
##     url = {https://CRAN.R-project.org/package=stringr},
##   }
## 
## 
## 
## 
## [[278]]
## 
## To cite package 'summarytools' in publications use:
## 
##   Comtois D (2022). _summarytools: Tools to Quickly and Neatly
##   Summarize Data_. R package version 1.0.1,
##   <https://CRAN.R-project.org/package=summarytools>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {summarytools: Tools to Quickly and Neatly Summarize Data},
##     author = {Dominic Comtois},
##     year = {2022},
##     note = {R package version 1.0.1},
##     url = {https://CRAN.R-project.org/package=summarytools},
##   }
## 
## 
## 
## 
## [[279]]
## 
## To cite the survey package in publications use one or more of:
## 
##   T. Lumley (2020) "survey: analysis of complex survey samples". R
##   package version 4.0.
## 
##   T. Lumley (2004) Analysis of complex survey samples. Journal of
##   Statistical Software 9(1): 1-19
## 
##   T. Lumley (2010) Complex Surveys: A Guide to Analysis Using R. John
##   Wiley and Sons.
## 
## To see these entries in BibTeX format, use 'print(<citation>,
## bibtex=TRUE)', 'toBibtex(.)', or set
## 'options(citation.bibtex.max=999)'.
## 
## 
## [[280]]
## 
## To cite package 'swirl' in publications use:
## 
##   Kross S, Carchedi N, Bauer B, Grdina G (2020). _swirl: Learn R, in
##   R_. R package version 2.4.5,
##   <https://CRAN.R-project.org/package=swirl>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {swirl: Learn R, in R},
##     author = {Sean Kross and Nick Carchedi and Bill Bauer and Gina Grdina},
##     year = {2020},
##     note = {R package version 2.4.5},
##     url = {https://CRAN.R-project.org/package=swirl},
##   }
## 
## 
## 
## 
## [[281]]
## 
## To cite package 'sys' in publications use:
## 
##   Ooms J (2023). _sys: Powerful and Reliable Tools for Running System
##   Commands in R_. R package version 3.4.2,
##   <https://CRAN.R-project.org/package=sys>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {sys: Powerful and Reliable Tools for Running System Commands in R},
##     author = {Jeroen Ooms},
##     year = {2023},
##     note = {R package version 3.4.2},
##     url = {https://CRAN.R-project.org/package=sys},
##   }
## 
## 
## 
## 
## [[282]]
## 
## To cite systemfit in publications use:
## 
##   Arne Henningsen and Jeff D. Hamann (2007). systemfit: A Package for
##   Estimating Systems of Simultaneous Equations in R. Journal of
##   Statistical Software 23(4), 1-40. URL
##   https://www.jstatsoft.org/v23/i04/.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Article{,
##     title = {systemfit: A Package for Estimating Systems of Simultaneous Equations in R},
##     author = {Arne Henningsen and Jeff D. Hamann},
##     journal = {Journal of Statistical Software},
##     year = {2007},
##     volume = {23},
##     number = {4},
##     pages = {1--40},
##     url = {https://www.jstatsoft.org/v23/i04/},
##   }
## 
## 
## [[283]]
## 
## To cite package 'Tcomp' in publications use:
## 
##   Ellis P (2018). _Tcomp: Data from the 2010 Tourism Forecasting
##   Competition_. R package version 1.0.1,
##   <https://CRAN.R-project.org/package=Tcomp>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {Tcomp: Data from the 2010 Tourism Forecasting Competition},
##     author = {Peter Ellis},
##     year = {2018},
##     note = {R package version 1.0.1},
##     url = {https://CRAN.R-project.org/package=Tcomp},
##   }
## 
## 
## 
## 
## [[284]]
## 
## To cite package 'tensor' in publications use:
## 
##   Rougier J (2012). _tensor: Tensor product of arrays_. R package
##   version 1.5, <https://CRAN.R-project.org/package=tensor>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {tensor: Tensor product of arrays},
##     author = {Jonathan Rougier},
##     year = {2012},
##     note = {R package version 1.5},
##     url = {https://CRAN.R-project.org/package=tensor},
##   }
## 
## ATTENTION: This citation information has been auto-generated from the
## package DESCRIPTION file and may need manual editing, see
## 'help("citation")'.
## 
## 
## 
## 
## [[285]]
## 
## To cite package 'testthat' in publications use:
## 
##   Wickham H (2011). "testthat: Get Started with Testing." _The R
##   Journal_, *3*, 5-10.
##   <https://journal.r-project.org/archive/2011-1/RJournal_2011-1_Wickham.pdf>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Article{,
##     author = {Hadley Wickham},
##     title = {testthat: Get Started with Testing},
##     journal = {The R Journal},
##     year = {2011},
##     volume = {3},
##     pages = {5--10},
##     url = {https://journal.r-project.org/archive/2011-1/RJournal_2011-1_Wickham.pdf},
##   }
## 
## 
## [[286]]
## 
## To cite package 'tibble' in publications use:
## 
##   Müller K, Wickham H (2023). _tibble: Simple Data Frames_. R package
##   version 3.2.1, <https://CRAN.R-project.org/package=tibble>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {tibble: Simple Data Frames},
##     author = {Kirill Müller and Hadley Wickham},
##     year = {2023},
##     note = {R package version 3.2.1},
##     url = {https://CRAN.R-project.org/package=tibble},
##   }
## 
## 
## 
## 
## [[287]]
## 
## To cite package 'tictoc' in publications use:
## 
##   Izrailev S (2023). _tictoc: Functions for Timing R Scripts, as Well
##   as Implementations of "Stack" and "StackList" Structures_. R package
##   version 1.2, <https://CRAN.R-project.org/package=tictoc>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {tictoc: Functions for Timing R Scripts, as Well as Implementations of
## "Stack" and "StackList" Structures},
##     author = {Sergei Izrailev},
##     year = {2023},
##     note = {R package version 1.2},
##     url = {https://CRAN.R-project.org/package=tictoc},
##   }
## 
## ATTENTION: This citation information has been auto-generated from the
## package DESCRIPTION file and may need manual editing, see
## 'help("citation")'.
## 
## 
## 
## 
## [[288]]
## 
## To cite package 'tidygraph' in publications use:
## 
##   Pedersen T (2023). _tidygraph: A Tidy API for Graph Manipulation_. R
##   package version 1.2.3,
##   <https://CRAN.R-project.org/package=tidygraph>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {tidygraph: A Tidy API for Graph Manipulation},
##     author = {Thomas Lin Pedersen},
##     year = {2023},
##     note = {R package version 1.2.3},
##     url = {https://CRAN.R-project.org/package=tidygraph},
##   }
## 
## 
## 
## 
## [[289]]
## 
## To cite package 'tidyquant' in publications use:
## 
##   Dancho M, Vaughan D (2023). _tidyquant: Tidy Quantitative Financial
##   Analysis_. R package version 1.0.7,
##   <https://CRAN.R-project.org/package=tidyquant>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {tidyquant: Tidy Quantitative Financial Analysis},
##     author = {Matt Dancho and Davis Vaughan},
##     year = {2023},
##     note = {R package version 1.0.7},
##     url = {https://CRAN.R-project.org/package=tidyquant},
##   }
## 
## 
## 
## 
## [[290]]
## 
## To cite package 'tidyverse' in publications use:
## 
##   Wickham H, Averick M, Bryan J, Chang W, McGowan LD, François R,
##   Grolemund G, Hayes A, Henry L, Hester J, Kuhn M, Pedersen TL, Miller
##   E, Bache SM, Müller K, Ooms J, Robinson D, Seidel DP, Spinu V,
##   Takahashi K, Vaughan D, Wilke C, Woo K, Yutani H (2019). "Welcome to
##   the tidyverse." _Journal of Open Source Software_, *4*(43), 1686.
##   doi:10.21105/joss.01686 <https://doi.org/10.21105/joss.01686>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Article{,
##     title = {Welcome to the {tidyverse}},
##     author = {Hadley Wickham and Mara Averick and Jennifer Bryan and Winston Chang and Lucy D'Agostino McGowan and Romain François and Garrett Grolemund and Alex Hayes and Lionel Henry and Jim Hester and Max Kuhn and Thomas Lin Pedersen and Evan Miller and Stephan Milton Bache and Kirill Müller and Jeroen Ooms and David Robinson and Dana Paige Seidel and Vitalie Spinu and Kohske Takahashi and Davis Vaughan and Claus Wilke and Kara Woo and Hiroaki Yutani},
##     year = {2019},
##     journal = {Journal of Open Source Software},
##     volume = {4},
##     number = {43},
##     pages = {1686},
##     doi = {10.21105/joss.01686},
##   }
## 
## 
## [[291]]
## 
## To cite package 'timetk' in publications use:
## 
##   Dancho M, Vaughan D (2023). _timetk: A Tool Kit for Working with Time
##   Series_. R package version 2.8.3,
##   <https://CRAN.R-project.org/package=timetk>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {timetk: A Tool Kit for Working with Time Series},
##     author = {Matt Dancho and Davis Vaughan},
##     year = {2023},
##     note = {R package version 2.8.3},
##     url = {https://CRAN.R-project.org/package=timetk},
##   }
## 
## 
## 
## 
## [[292]]
## 
## To cite package 'tinytex' in publications use:
## 
##   Xie Y (2023). _tinytex: Helper Functions to Install and Maintain TeX
##   Live, and Compile LaTeX Documents_. R package version 0.45,
##   <https://github.com/rstudio/tinytex>.
## 
##   Xie Y (2019). "TinyTeX: A lightweight, cross-platform, and
##   easy-to-maintain LaTeX distribution based on TeX Live." _TUGboat_,
##   *40*(1), 30-32. <https://tug.org/TUGboat/Contents/contents40-1.html>.
## 
## To see these entries in BibTeX format, use 'print(<citation>,
## bibtex=TRUE)', 'toBibtex(.)', or set
## 'options(citation.bibtex.max=999)'.
## 
## 
## [[293]]
## 
## To cite tmap/tmaptools in publications use:
## 
##   Tennekes M (2018). "tmap: Thematic Maps in R." _Journal of
##   Statistical Software_, *84*(6), 1-39. doi:10.18637/jss.v084.i06
##   <https://doi.org/10.18637/jss.v084.i06>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Article{,
##     title = {{tmap}: Thematic Maps in {R}},
##     author = {Martijn Tennekes},
##     journal = {Journal of Statistical Software},
##     year = {2018},
##     volume = {84},
##     number = {6},
##     pages = {1--39},
##     doi = {10.18637/jss.v084.i06},
##   }
## 
## 
## 
## 
## [[294]]
## 
## To cite package 'tmaptools' in publications use:
## 
##   Tennekes M (2021). _tmaptools: Thematic Map Tools_. R package version
##   3.1-1, <https://CRAN.R-project.org/package=tmaptools>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {tmaptools: Thematic Map Tools},
##     author = {Martijn Tennekes},
##     year = {2021},
##     note = {R package version 3.1-1},
##     url = {https://CRAN.R-project.org/package=tmaptools},
##   }
## 
## 
## 
## 
## [[295]]
## 
## To cite package 'truncreg' in publications use:
## 
##   Croissant Y, Zeileis A (2018). _truncreg: Truncated Gaussian
##   Regression Models_. R package version 0.2-5,
##   <https://CRAN.R-project.org/package=truncreg>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {truncreg: Truncated Gaussian Regression Models},
##     author = {Yves Croissant and Achim Zeileis},
##     year = {2018},
##     note = {R package version 0.2-5},
##     url = {https://CRAN.R-project.org/package=truncreg},
##   }
## 
## 
## 
## 
## [[296]]
## 
## To cite package 'trust' in publications use:
## 
##   Geyer. CJ (2020). _trust: Trust Region Optimization_. R package
##   version 0.1-8, <https://CRAN.R-project.org/package=trust>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {trust: Trust Region Optimization},
##     author = {Charles J. Geyer.},
##     year = {2020},
##     note = {R package version 0.1-8},
##     url = {https://CRAN.R-project.org/package=trust},
##   }
## 
## ATTENTION: This citation information has been auto-generated from the
## package DESCRIPTION file and may need manual editing, see
## 'help("citation")'.
## 
## 
## 
## 
## [[297]]
## 
## To cite package 'tseries' in publications use:
## 
##   Trapletti A, Hornik K (2023). _tseries: Time Series Analysis and
##   Computational Finance_. R package version 0.10-54,
##   <https://CRAN.R-project.org/package=tseries>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {tseries: Time Series Analysis and Computational Finance},
##     author = {Adrian Trapletti and Kurt Hornik},
##     year = {2023},
##     note = {R package version 0.10-54},
##     url = {https://CRAN.R-project.org/package=tseries},
##   }
## 
## 
## 
## 
## [[298]]
## 
## To cite package 'tsfeatures' in publications use:
## 
##   Hyndman R, Kang Y, Montero-Manso P, Talagala T, Wang E, Yang Y,
##   O'Hara-Wild M (2022). _tsfeatures: Time Series Feature Extraction_. R
##   package version 1.1, <https://CRAN.R-project.org/package=tsfeatures>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {tsfeatures: Time Series Feature Extraction},
##     author = {Rob Hyndman and Yanfei Kang and Pablo Montero-Manso and Thiyanga Talagala and Earo Wang and Yangzhuoran Yang and Mitchell O'Hara-Wild},
##     year = {2022},
##     note = {R package version 1.1},
##     url = {https://CRAN.R-project.org/package=tsfeatures},
##   }
## 
## 
## 
## 
## [[299]]
## 
## To cite tsibble in publications, please use:
## 
##   Wang, E, D Cook, and RJ Hyndman (2020). A new tidy data structure to
##   support exploration and modeling of temporal data, Journal of
##   Computational and Graphical Statistics, 29:3, 466-478,
##   doi:10.1080/10618600.2019.1695624.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Article{,
##     author = {Earo Wang and Dianne Cook and Rob J Hyndman},
##     title = {A new tidy data structure to support exploration and modeling of temporal data},
##     journal = {Journal of Computational and Graphical Statistics},
##     volume = {29},
##     number = {3},
##     pages = {466-478},
##     year = {2020},
##     publisher = {Taylor & Francis},
##     doi = {10.1080/10618600.2019.1695624},
##     url = {https://doi.org/10.1080/10618600.2019.1695624},
##   }
## 
## 
## [[300]]
## 
## To cite package 'tsibbledata' in publications use:
## 
##   O'Hara-Wild M, Hyndman R, Wang E, Godahewa R (2023). _tsibbledata:
##   Diverse Datasets for 'tsibble'_. https://tsibbledata.tidyverts.org/,
##   https://github.com/tidyverts/tsibbledata/.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {tsibbledata: Diverse Datasets for 'tsibble'},
##     author = {Mitchell O'Hara-Wild and Rob Hyndman and Earo Wang and Rakshitha Godahewa},
##     year = {2023},
##     note = {https://tsibbledata.tidyverts.org/,
## https://github.com/tidyverts/tsibbledata/},
##   }
## 
## 
## 
## 
## [[301]]
## 
## To cite package 'tweenr' in publications use:
## 
##   Pedersen T (2022). _tweenr: Interpolate Data for Smooth Animations_.
##   R package version 2.0.2, <https://CRAN.R-project.org/package=tweenr>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {tweenr: Interpolate Data for Smooth Animations},
##     author = {Thomas Lin Pedersen},
##     year = {2022},
##     note = {R package version 2.0.2},
##     url = {https://CRAN.R-project.org/package=tweenr},
##   }
## 
## 
## 
## 
## [[302]]
## 
## To cite package 'tzdb' in publications use:
## 
##   Vaughan D (2023). _tzdb: Time Zone Database Information_. R package
##   version 0.4.0, <https://CRAN.R-project.org/package=tzdb>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {tzdb: Time Zone Database Information},
##     author = {Davis Vaughan},
##     year = {2023},
##     note = {R package version 0.4.0},
##     url = {https://CRAN.R-project.org/package=tzdb},
##   }
## 
## 
## 
## 
## [[303]]
## 
## To cite UBL in publications use:
## 
##   Paula Branco, Rita P. Ribeiro, Luis Torgo (2016)., UBL: an R Package
##   for Utility-Based Learning, CoRR abs/1604.08079 [cs.MS], URL:
##   http://arxiv.org/abs/1604.08079
## 
## A BibTeX entry for LaTeX users is
## 
##   @Article{,
##     title = {{UBL}: an R Package for Utility-Based Learning},
##     author = {Paula Branco and Rita P. Ribeiro and Luis Torgo},
##     year = {2016},
##     ee = {http://arxiv.org/abs/1604.08079},
##     volume = {abs/1604.08079},
##     journal = {CoRR},
##   }
## 
## 
## [[304]]
## 
## To cite the urca package in publications use:
## 
##   Pfaff, B. (2008) Analysis of Integrated and Cointegrated Time Series
##   with R. Second Edition. Springer, New York. ISBN 0-387-27960-1
## 
## A BibTeX entry for LaTeX users is
## 
##   @Book{,
##     title = {Analysis of Integrated and Cointegrated Time Series with R},
##     author = {B. Pfaff},
##     publisher = {Springer},
##     edition = {Second},
##     address = {New York},
##     year = {2008},
##     note = {ISBN 0-387-27960-1},
##     url = {https://www.pfaffikus.de},
##   }
## 
## For BibTex versions of citations use: toBibtex(citation('urca'))
## 
## 
## [[305]]
## 
## To cite package 'usmap' in publications use:
## 
##   Di Lorenzo P (2022). _usmap: US Maps Including Alaska and Hawaii_. R
##   package version 0.6.1, <https://CRAN.R-project.org/package=usmap>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {usmap: US Maps Including Alaska and Hawaii},
##     author = {Paolo {Di Lorenzo}},
##     year = {2022},
##     note = {R package version 0.6.1},
##     url = {https://CRAN.R-project.org/package=usmap},
##   }
## 
## 
## 
## 
## [[306]]
## 
## To cite package 'usmapdata' in publications use:
## 
##   Di Lorenzo P (2022). _usmapdata: Mapping Data for 'usmap' Package_. R
##   package version 0.1.0,
##   <https://CRAN.R-project.org/package=usmapdata>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {usmapdata: Mapping Data for 'usmap' Package},
##     author = {Paolo {Di Lorenzo}},
##     year = {2022},
##     note = {R package version 0.1.0},
##     url = {https://CRAN.R-project.org/package=usmapdata},
##   }
## 
## 
## 
## 
## [[307]]
## 
## To cite package 'utf8' in publications use:
## 
##   Perry PO (2023). _utf8: Unicode Text Processing_. R package version
##   1.2.4, <https://CRAN.R-project.org/package=utf8>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {utf8: Unicode Text Processing},
##     author = {Patrick O. Perry},
##     year = {2023},
##     note = {R package version 1.2.4},
##     url = {https://CRAN.R-project.org/package=utf8},
##   }
## 
## 
## 
## 
## [[308]]
## 
## To cite vars in publications use:
## 
##   Bernhard Pfaff (2008). VAR, SVAR and SVEC Models: Implementation
##   Within R Package vars. Journal of Statistical Software 27(4). URL
##   https://www.jstatsoft.org/v27/i04/.
## 
##   Pfaff, B. (2008) Analysis of Integrated and Cointegrated Time Series
##   with R. Second Edition. Springer, New York. ISBN 0-387-27960-1
## 
## For BibTex versions of citations use: toBibtex(citation('vars'))
## To see these entries in BibTeX format, use 'print(<citation>,
## bibtex=TRUE)', 'toBibtex(.)', or set
## 'options(citation.bibtex.max=999)'.
## 
## 
## [[309]]
## 
## To cite package 'vctrs' in publications use:
## 
##   Wickham H, Henry L, Vaughan D (2023). _vctrs: Vector Helpers_. R
##   package version 0.6.4, <https://CRAN.R-project.org/package=vctrs>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {vctrs: Vector Helpers},
##     author = {Hadley Wickham and Lionel Henry and Davis Vaughan},
##     year = {2023},
##     note = {R package version 0.6.4},
##     url = {https://CRAN.R-project.org/package=vctrs},
##   }
## 
## 
## 
## 
## [[310]]
## 
## To cite VIM in publications use:
## 
##   Alexander Kowarik, Matthias Templ (2016). Imputation with the R
##   Package VIM. Journal of Statistical Software, 74(7), 1-16.
##   doi:10.18637/jss.v074.i07
## 
## A BibTeX entry for LaTeX users is
## 
##   @Article{,
##     title = {Imputation with the {R} Package {VIM}},
##     author = {Alexander Kowarik and Matthias Templ},
##     journal = {Journal of Statistical Software},
##     year = {2016},
##     volume = {74},
##     number = {7},
##     pages = {1--16},
##     doi = {10.18637/jss.v074.i07},
##   }
## 
## 
## 
## 
## [[311]]
## 
## To cite viridis/viridisLite in publications use:
## 
##   Simon Garnier, Noam Ross, Robert Rudis, Antônio P. Camargo, Marco
##   Sciaini, and Cédric Scherer (2023). viridis(Lite) -
##   Colorblind-Friendly Color Maps for R. viridisLite package version
##   0.4.2.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {{viridis(Lite)} - Colorblind-Friendly Color Maps for R},
##     author = {{Garnier} and {Simon} and {Ross} and {Noam} and {Rudis} and {Robert} and {Camargo} and Antônio Pedro and {Sciaini} and {Marco} and {Scherer} and {Cédric}},
##     year = {2023},
##     note = {viridisLite package version 0.4.2},
##     url = {https://sjmgarnier.github.io/viridis/},
##     doi = {10.5281/zenodo.4678327},
##   }
## 
## 
## [[312]]
## 
## To cite package 'visdat' in publications use:
## 
##   Tierney N (2017). "visdat: Visualising Whole Data Frames." _JOSS_,
##   *2*(16), 355. doi:10.21105/joss.00355
##   <https://doi.org/10.21105/joss.00355>,
##   <http://dx.doi.org/10.21105/joss.00355>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Article{,
##     title = {visdat: Visualising Whole Data Frames},
##     author = {Nicholas Tierney},
##     doi = {10.21105/joss.00355},
##     url = {http://dx.doi.org/10.21105/joss.00355},
##     year = {2017},
##     publisher = {Journal of Open Source Software},
##     volume = {2},
##     number = {16},
##     pages = {355},
##     journal = {JOSS},
##   }
## 
## 
## [[313]]
## 
## To cite package 'vroom' in publications use:
## 
##   Hester J, Wickham H, Bryan J (2023). _vroom: Read and Write
##   Rectangular Text Data Quickly_. R package version 1.6.4,
##   <https://CRAN.R-project.org/package=vroom>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {vroom: Read and Write Rectangular Text Data Quickly},
##     author = {Jim Hester and Hadley Wickham and Jennifer Bryan},
##     year = {2023},
##     note = {R package version 1.6.4},
##     url = {https://CRAN.R-project.org/package=vroom},
##   }
## 
## 
## 
## 
## [[314]]
## 
## To cite package 'waldo' in publications use:
## 
##   Wickham H (2023). _waldo: Find Differences Between R Objects_. R
##   package version 0.5.2, <https://CRAN.R-project.org/package=waldo>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {waldo: Find Differences Between R Objects},
##     author = {Hadley Wickham},
##     year = {2023},
##     note = {R package version 0.5.2},
##     url = {https://CRAN.R-project.org/package=waldo},
##   }
## 
## 
## 
## 
## [[315]]
## 
## To cite package 'widgetframe' in publications use:
## 
##   Karambelkar B (2017). _widgetframe: 'Htmlwidgets' in Responsive
##   'iframes'_. R package version 0.3.1,
##   <https://CRAN.R-project.org/package=widgetframe>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {widgetframe: 'Htmlwidgets' in Responsive 'iframes'},
##     author = {Bhaskar Karambelkar},
##     year = {2017},
##     note = {R package version 0.3.1},
##     url = {https://CRAN.R-project.org/package=widgetframe},
##   }
## 
## 
## 
## 
## [[316]]
## 
## To cite package 'withr' in publications use:
## 
##   Hester J, Henry L, Müller K, Ushey K, Wickham H, Chang W (2023).
##   _withr: Run Code 'With' Temporarily Modified Global State_. R package
##   version 2.5.2, <https://CRAN.R-project.org/package=withr>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {withr: Run Code 'With' Temporarily Modified Global State},
##     author = {Jim Hester and Lionel Henry and Kirill Müller and Kevin Ushey and Hadley Wickham and Winston Chang},
##     year = {2023},
##     note = {R package version 2.5.2},
##     url = {https://CRAN.R-project.org/package=withr},
##   }
## 
## 
## 
## 
## [[317]]
## 
## To cite package 'xfun' in publications use:
## 
##   Xie Y (2023). _xfun: Supporting Functions for Packages Maintained by
##   'Yihui Xie'_. R package version 0.39,
##   <https://CRAN.R-project.org/package=xfun>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {xfun: Supporting Functions for Packages Maintained by 'Yihui Xie'},
##     author = {Yihui Xie},
##     year = {2023},
##     note = {R package version 0.39},
##     url = {https://CRAN.R-project.org/package=xfun},
##   }
## 
## 
## 
## 
## [[318]]
## 
## To cite package 'XML' in publications use:
## 
##   Temple Lang D (2023). _XML: Tools for Parsing and Generating XML
##   Within R and S-Plus_. R package version 3.99-0.14,
##   <https://CRAN.R-project.org/package=XML>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {XML: Tools for Parsing and Generating XML Within R and S-Plus},
##     author = {Duncan {Temple Lang}},
##     year = {2023},
##     note = {R package version 3.99-0.14},
##     url = {https://CRAN.R-project.org/package=XML},
##   }
## 
## 
## 
## 
## [[319]]
## 
## To cite package 'xml2' in publications use:
## 
##   Wickham H, Hester J, Ooms J (2023). _xml2: Parse XML_. R package
##   version 1.3.4, <https://CRAN.R-project.org/package=xml2>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {xml2: Parse XML},
##     author = {Hadley Wickham and Jim Hester and Jeroen Ooms},
##     year = {2023},
##     note = {R package version 1.3.4},
##     url = {https://CRAN.R-project.org/package=xml2},
##   }
## 
## 
## 
## 
## [[320]]
## 
## To cite package 'xts' in publications use:
## 
##   Ryan JA, Ulrich JM (2023). _xts: eXtensible Time Series_. R package
##   version 0.13.1, <https://CRAN.R-project.org/package=xts>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {xts: eXtensible Time Series},
##     author = {Jeffrey A. Ryan and Joshua M. Ulrich},
##     year = {2023},
##     note = {R package version 0.13.1},
##     url = {https://CRAN.R-project.org/package=xts},
##   }
## 
## 
## 
## 
## [[321]]
## 
## To cite package 'yaImpute' in publications use:
## 
##   Crookston, Nicholas L.; Finley, Andrew O. 2007.  yaImpute: An R
##   Package for k-NN Imputation.  Journal of Statistical Software.
##   23(10):1-16.  https://doi.org/10.18637/jss.v023.i10
## 
## A BibTeX entry for LaTeX users is
## 
##   @Article{,
##     title = {yaImpute: An R Package for kNN Imputation},
##     author = {Nicholas L. Crookston and Andrew O. Finley},
##     journal = {Journal of Statistical Software},
##     volume = {23},
##     number = {10},
##     day = {10},
##     month = {10},
##     year = {2007},
##     coden = {JSSOBK},
##     issn = {1548-7660},
##     bibdate = {2007-10-10},
##     url = {https://doi.org/10.18637/jss.v023.i10},
##     accepted = {2007-10-10},
##     submitted = {2007-06-20},
##   }
## 
## 
## [[322]]
## 
## To cite package 'yarrr' in publications use:
## 
##   Phillips N (2017). _yarrr: A Companion to the e-Book "YaRrr!: The
##   Pirate's Guide to R"_. R package version 0.1.5,
##   <https://CRAN.R-project.org/package=yarrr>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {yarrr: A Companion to the e-Book "YaRrr!: The Pirate's Guide to R"},
##     author = {Nathaniel Phillips},
##     year = {2017},
##     note = {R package version 0.1.5},
##     url = {https://CRAN.R-project.org/package=yarrr},
##   }
## 
## 
## 
## 
## [[323]]
## 
## To cite zoo in publications use:
## 
##   Zeileis A, Grothendieck G (2005). "zoo: S3 Infrastructure for Regular
##   and Irregular Time Series." _Journal of Statistical Software_,
##   *14*(6), 1-27. doi:10.18637/jss.v014.i06
##   <https://doi.org/10.18637/jss.v014.i06>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Article{,
##     title = {zoo: S3 Infrastructure for Regular and Irregular Time Series},
##     author = {Achim Zeileis and Gabor Grothendieck},
##     journal = {Journal of Statistical Software},
##     year = {2005},
##     volume = {14},
##     number = {6},
##     pages = {1--27},
##     doi = {10.18637/jss.v014.i06},
##   }
## 
## 
## 
## 
## [[324]]
## 
## To cite package 'abind' in publications use:
## 
##   Plate T, Heiberger R (2016). _abind: Combine Multidimensional
##   Arrays_. R package version 1.4-5,
##   <https://CRAN.R-project.org/package=abind>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {abind: Combine Multidimensional Arrays},
##     author = {Tony Plate and Richard Heiberger},
##     year = {2016},
##     note = {R package version 1.4-5},
##     url = {https://CRAN.R-project.org/package=abind},
##   }
## 
## ATTENTION: This citation information has been auto-generated from the
## package DESCRIPTION file and may need manual editing, see
## 'help("citation")'.
## 
## 
## 
## 
## [[325]]
## 
## To cite package 'acepack' in publications use:
## 
##   Spector P, Friedman J, Tibshirani R, Lumley T, Garbett S, Baron J
##   (2016). _acepack: ACE and AVAS for Selecting Multiple Regression
##   Transformations_. R package version 1.4.1,
##   <https://CRAN.R-project.org/package=acepack>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {acepack: ACE and AVAS for Selecting Multiple Regression Transformations},
##     author = {Phil Spector and Jerome Friedman and Robert Tibshirani and Thomas Lumley and Shawn Garbett and Jonathan Baron},
##     year = {2016},
##     note = {R package version 1.4.1},
##     url = {https://CRAN.R-project.org/package=acepack},
##   }
## 
## ATTENTION: This citation information has been auto-generated from the
## package DESCRIPTION file and may need manual editing, see
## 'help("citation")'.
## 
## 
## 
## 
## [[326]]
## 
## To cite AER, please use:
## 
##   Christian Kleiber and Achim Zeileis (2008). Applied Econometrics with
##   R. New York: Springer-Verlag. ISBN 978-0-387-77316-2. URL
##   https://CRAN.R-project.org/package=AER
## 
## A BibTeX entry for LaTeX users is
## 
##   @Book{,
##     title = {Applied Econometrics with {R}},
##     author = {Christian Kleiber and Achim Zeileis},
##     year = {2008},
##     publisher = {Springer-Verlag},
##     address = {New York},
##     note = {{ISBN} 978-0-387-77316-2},
##     url = {https://CRAN.R-project.org/package=AER},
##   }
## 
## 
## 
## 
## [[327]]
## 
## To cite Amelia in publications use:
## 
##   James Honaker, Gary King, Matthew Blackwell (2011). Amelia II: A
##   Program for Missing Data. Journal of Statistical Software, 45(7),
##   1-47. URL https://www.jstatsoft.org/v45/i07/.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Article{,
##     title = {{Amelia II}: A Program for Missing Data},
##     author = {James Honaker and Gary King and Matthew Blackwell},
##     journal = {Journal of Statistical Software},
##     year = {2011},
##     volume = {45},
##     number = {7},
##     pages = {1--47},
##     doi = {10.18637/jss.v045.i07},
##   }
## 
## 
## [[328]]
## 
## To cite package 'animint2' in publications use:
## 
##   Hocking T, Wickham H, Chang W, Lewin-Koh N, Maechler M, Prium R,
##   VanderPlas S, Sievert C, Ferris K, Cai J, Khan F, Kumar V, Singh H,
##   Fei Y (2023). _animint2: Animated Interactive Grammar of Graphics_. R
##   package version 2023.3.14,
##   <https://CRAN.R-project.org/package=animint2>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {animint2: Animated Interactive Grammar of Graphics},
##     author = {Toby Hocking and Hadley Wickham and Winston Chang and Nicholas Lewin-Koh and Martin Maechler and Randall Prium and Susan VanderPlas and Carson Sievert and Kevin Ferris and Jun Cai and Faizan Khan and Vivek Kumar and Himanshu Singh and Yufan Fei},
##     year = {2023},
##     note = {R package version 2023.3.14},
##     url = {https://CRAN.R-project.org/package=animint2},
##   }
## 
## 
## 
## 
## [[329]]
## 
## To cite package 'aplpack' in publications use:
## 
##   Wolf H (2019). _aplpack: Another Plot Package (version 190512)_.
##   <https://cran.r-project.org/package=aplpack>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {{aplpack}: Another Plot Package (version 190512)},
##     author = {Hans Peter Wolf},
##     year = {2019},
##     url = {https://cran.r-project.org/package=aplpack},
##   }
## 
## 
## [[330]]
## 
## To cite package 'askpass' in publications use:
## 
##   Ooms J (2023). _askpass: Password Entry Utilities for R, Git, and
##   SSH_. R package version 1.2.0,
##   <https://CRAN.R-project.org/package=askpass>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {askpass: Password Entry Utilities for R, Git, and SSH},
##     author = {Jeroen Ooms},
##     year = {2023},
##     note = {R package version 1.2.0},
##     url = {https://CRAN.R-project.org/package=askpass},
##   }
## 
## 
## 
## 
## [[331]]
## 
## To cite package 'assertthat' in publications use:
## 
##   Wickham H (2019). _assertthat: Easy Pre and Post Assertions_. R
##   package version 0.2.1,
##   <https://CRAN.R-project.org/package=assertthat>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {assertthat: Easy Pre and Post Assertions},
##     author = {Hadley Wickham},
##     year = {2019},
##     note = {R package version 0.2.1},
##     url = {https://CRAN.R-project.org/package=assertthat},
##   }
## 
## 
## 
## 
## [[332]]
## 
## To cite package automap in publications use:
## 
##   Hiemstra, P.H., Pebesma, E.J., Twenhofel, C.J.W. and G.B.M.
##   Heuvelink, 2008. Real-time automatic interpolation of ambient gamma
##   dose rates from the Dutch Radioactivity Monitoring Network. Computers
##   & Geosciences, accepted for publication.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Article{,
##     title = {Real-time automatic interpolation of ambient gamma dose rates from the Dutch Radioactivity Monitoring Network},
##     author = {P.H. Hiemstra and E.J. Pebesma and C.J.W. Twenh"{o}fel and G.B.M. Heuvelink},
##     journal = {Computers & Geosciences},
##     year = {2008},
##     note = {DOI: http://dx.doi.org/10.1016/j.cageo.2008.10.011},
##   }
## 
## 
## [[333]]
## 
## To cite package 'backports' in publications use:
## 
##   Lang M, R Core Team (2021). _backports: Reimplementations of
##   Functions Introduced Since R-3.0.0_. R package version 1.4.1,
##   <https://CRAN.R-project.org/package=backports>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {backports: Reimplementations of Functions Introduced Since R-3.0.0},
##     author = {Michel Lang and {R Core Team}},
##     year = {2021},
##     note = {R package version 1.4.1},
##     url = {https://CRAN.R-project.org/package=backports},
##   }
## 
## 
## 
## 
## [[334]]
## 
## To cite R in publications use:
## 
##   R Core Team (2022). R: A language and environment for statistical
##   computing. R Foundation for Statistical Computing, Vienna, Austria.
##   URL https://www.R-project.org/.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {R: A Language and Environment for Statistical Computing},
##     author = {{R Core Team}},
##     organization = {R Foundation for Statistical Computing},
##     address = {Vienna, Austria},
##     year = {2022},
##     url = {https://www.R-project.org/},
##   }
## 
## We have invested a lot of time and effort in creating R, please cite it
## when using it for data analysis. See also 'citation("pkgname")' for
## citing R packages.
## 
## 
## [[335]]
## 
## To cite package 'base64enc' in publications use:
## 
##   Urbanek S (2015). _base64enc: Tools for base64 encoding_. R package
##   version 0.1-3, <https://CRAN.R-project.org/package=base64enc>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {base64enc: Tools for base64 encoding},
##     author = {Simon Urbanek},
##     year = {2015},
##     note = {R package version 0.1-3},
##     url = {https://CRAN.R-project.org/package=base64enc},
##   }
## 
## ATTENTION: This citation information has been auto-generated from the
## package DESCRIPTION file and may need manual editing, see
## 'help("citation")'.
## 
## 
## 
## 
## [[336]]
## 
## To cite bayestestR in publications use:
## 
##   Makowski, D., Ben-Shachar, M., & Lüdecke, D. (2019). bayestestR:
##   Describing Effects and their Uncertainty, Existence and Significance
##   within the Bayesian Framework. Journal of Open Source Software,
##   4(40), 1541. doi:10.21105/joss.01541
## 
## A BibTeX entry for LaTeX users is
## 
##   @Article{,
##     title = {bayestestR: Describing Effects and their Uncertainty, Existence and Significance within the Bayesian Framework.},
##     author = {Dominique Makowski and Mattan S. Ben-Shachar and Daniel Lüdecke},
##     journal = {Journal of Open Source Software},
##     doi = {10.21105/joss.01541},
##     year = {2019},
##     number = {40},
##     volume = {4},
##     pages = {1541},
##     url = {https://joss.theoj.org/papers/10.21105/joss.01541},
##   }
## 
## 
## [[337]]
## 
## To cite package 'bdsmatrix' in publications use:
## 
##   Therneau T (2022). _bdsmatrix: Routines for Block Diagonal Symmetric
##   Matrices_. R package version 1.3-6,
##   <https://CRAN.R-project.org/package=bdsmatrix>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {bdsmatrix: Routines for Block Diagonal Symmetric Matrices},
##     author = {Terry Therneau},
##     year = {2022},
##     note = {R package version 1.3-6},
##     url = {https://CRAN.R-project.org/package=bdsmatrix},
##   }
## 
## ATTENTION: This citation information has been auto-generated from the
## package DESCRIPTION file and may need manual editing, see
## 'help("citation")'.
## 
## 
## 
## 
## [[338]]
## 
## To cite package 'bea.R' in publications use:
## 
##   Batch A (2018). _bea.R: Bureau of Economic Analysis API_. R package
##   version 1.0.6, <https://CRAN.R-project.org/package=bea.R>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {bea.R: Bureau of Economic Analysis API},
##     author = {Andrea Batch},
##     year = {2018},
##     note = {R package version 1.0.6},
##     url = {https://CRAN.R-project.org/package=bea.R},
##   }
## 
## 
## 
## 
## [[339]]
## 
## To cite package 'beeswarm' in publications use:
## 
##   Eklund A, Trimble J (2021). _beeswarm: The Bee Swarm Plot, an
##   Alternative to Stripchart_. R package version 0.4.0,
##   <https://CRAN.R-project.org/package=beeswarm>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {beeswarm: The Bee Swarm Plot, an Alternative to Stripchart},
##     author = {Aron Eklund and James Trimble},
##     year = {2021},
##     note = {R package version 0.4.0},
##     url = {https://CRAN.R-project.org/package=beeswarm},
##   }
## 
## 
## 
## 
## [[340]]
## 
## To cite package 'benchmarkme' in publications use:
## 
##   Gillespie C (2022). _benchmarkme: Crowd Sourced System Benchmarks_. R
##   package version 1.0.8,
##   <https://CRAN.R-project.org/package=benchmarkme>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {benchmarkme: Crowd Sourced System Benchmarks},
##     author = {Colin Gillespie},
##     year = {2022},
##     note = {R package version 1.0.8},
##     url = {https://CRAN.R-project.org/package=benchmarkme},
##   }
## 
## 
## 
## 
## [[341]]
## 
## To cite package 'benchmarkmeData' in publications use:
## 
##   Gillespie C (2020). _benchmarkmeData: Data Set for the 'benchmarkme'
##   Package_. R package version 1.0.4,
##   <https://CRAN.R-project.org/package=benchmarkmeData>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {benchmarkmeData: Data Set for the 'benchmarkme' Package},
##     author = {Colin Gillespie},
##     year = {2020},
##     note = {R package version 1.0.4},
##     url = {https://CRAN.R-project.org/package=benchmarkmeData},
##   }
## 
## 
## 
## 
## [[342]]
## 
## To cite package 'bestglm' in publications use:
## 
##   McLeod A, Xu C, Lai Y (2020). _bestglm: Best Subset GLM and
##   Regression Utilities_. R package version 0.37.3,
##   <https://CRAN.R-project.org/package=bestglm>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {bestglm: Best Subset GLM and Regression Utilities},
##     author = {A.I. McLeod and Changjiang Xu and Yuanhao Lai},
##     year = {2020},
##     note = {R package version 0.37.3},
##     url = {https://CRAN.R-project.org/package=bestglm},
##   }
## 
## ATTENTION: This citation information has been auto-generated from the
## package DESCRIPTION file and may need manual editing, see
## 'help("citation")'.
## 
## 
## 
## 
## [[343]]
## 
## To cite package 'BH' in publications use:
## 
##   Eddelbuettel D, Emerson JW, Kane MJ (2023). _BH: Boost C++ Header
##   Files_. R package version 1.81.0-1,
##   <https://CRAN.R-project.org/package=BH>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {BH: Boost C++ Header Files},
##     author = {Dirk Eddelbuettel and John W. Emerson and Michael J. Kane},
##     year = {2023},
##     note = {R package version 1.81.0-1},
##     url = {https://CRAN.R-project.org/package=BH},
##   }
## 
## ATTENTION: This citation information has been auto-generated from the
## package DESCRIPTION file and may need manual editing, see
## 'help("citation")'.
## 
## 
## 
## 
## [[344]]
## 
## To cite package 'bigD' in publications use:
## 
##   Iannone R (2022). _bigD: Flexibly Format Dates and Times to a Given
##   Locale_. R package version 0.2.0,
##   <https://CRAN.R-project.org/package=bigD>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {bigD: Flexibly Format Dates and Times to a Given Locale},
##     author = {Richard Iannone},
##     year = {2022},
##     note = {R package version 0.2.0},
##     url = {https://CRAN.R-project.org/package=bigD},
##   }
## 
## 
## 
## 
## [[345]]
## 
## To cite package 'BiocGenerics' in publications use:
## 
##   Orchestrating high-throughput genomic analysis with Bioconductor. W.
##   Huber, V.J. Carey, R. Gentleman, ..., M. Morgan Nature Methods,
##   2015:12, 115.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Article{,
##     author = {{Huber} and {W.} and {Carey} and V. J. and {Gentleman} and {R.} and {Anders} and {S.} and {Carlson} and {M.} and {Carvalho} and B. S. and {Bravo} and H. C. and {Davis} and {S.} and {Gatto} and {L.} and {Girke} and {T.} and {Gottardo} and {R.} and {Hahne} and {F.} and {Hansen} and K. D. and {Irizarry} and R. A. and {Lawrence} and {M.} and {Love} and M. I. and {MacDonald} and {J.} and {Obenchain} and {V.} and {{Ole's}} and A. K. and {{Pag`es}} and {H.} and {Reyes} and {A.} and {Shannon} and {P.} and {Smyth} and G. K. and {Tenenbaum} and {D.} and {Waldron} and {L.} and {Morgan} and {M.}},
##     title = {{O}rchestrating high-throughput genomic analysis with {B}ioconductor},
##     journal = {Nature Methods},
##     year = {2015},
##     volume = {12},
##     number = {2},
##     pages = {115--121},
##     url = {http://www.nature.com/nmeth/journal/v12/n2/full/nmeth.3252.html},
##   }
## 
## 
## [[346]]
## 
## To cite package 'BiocManager' in publications use:
## 
##   Morgan M (2022). _BiocManager: Access the Bioconductor Project
##   Package Repository_. R package version 1.30.19,
##   <https://CRAN.R-project.org/package=BiocManager>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {BiocManager: Access the Bioconductor Project Package Repository},
##     author = {Martin Morgan},
##     year = {2022},
##     note = {R package version 1.30.19},
##     url = {https://CRAN.R-project.org/package=BiocManager},
##   }
## 
## 
## 
## 
## [[347]]
## 
## To cite package 'BiocVersion' in publications use:
## 
##   Morgan M (2022). _BiocVersion: Set the appropriate version of
##   Bioconductor packages_. R package version 3.15.2.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {BiocVersion: Set the appropriate version of Bioconductor packages},
##     author = {Martin Morgan},
##     year = {2022},
##     note = {R package version 3.15.2},
##   }
## 
## 
## 
## 
## [[348]]
## 
## To cite package 'bit' in publications use:
## 
##   Oehlschlägel J, Ripley B (2022). _bit: Classes and Methods for Fast
##   Memory-Efficient Boolean Selections_. R package version 4.0.5,
##   <https://CRAN.R-project.org/package=bit>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {bit: Classes and Methods for Fast Memory-Efficient Boolean Selections},
##     author = {Jens Oehlschlägel and Brian Ripley},
##     year = {2022},
##     note = {R package version 4.0.5},
##     url = {https://CRAN.R-project.org/package=bit},
##   }
## 
## ATTENTION: This citation information has been auto-generated from the
## package DESCRIPTION file and may need manual editing, see
## 'help("citation")'.
## 
## 
## 
## 
## [[349]]
## 
## To cite package 'bit64' in publications use:
## 
##   Oehlschlägel J, Silvestri L (2020). _bit64: A S3 Class for Vectors of
##   64bit Integers_. R package version 4.0.5,
##   <https://CRAN.R-project.org/package=bit64>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {bit64: A S3 Class for Vectors of 64bit Integers},
##     author = {Jens Oehlschlägel and Leonardo Silvestri},
##     year = {2020},
##     note = {R package version 4.0.5},
##     url = {https://CRAN.R-project.org/package=bit64},
##   }
## 
## ATTENTION: This citation information has been auto-generated from the
## package DESCRIPTION file and may need manual editing, see
## 'help("citation")'.
## 
## 
## 
## 
## [[350]]
## 
## To cite package 'bitops' in publications use:
## 
##   port SobSDiR, revised ebMM, Dutky mbS (2021). _bitops: Bitwise
##   Operations_. R package version 1.0-7,
##   <https://CRAN.R-project.org/package=bitops>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {bitops: Bitwise Operations},
##     author = {S original by Steve Dutky initial R port and extensions by Martin Maechler; revised and modified by Steve Dutky},
##     year = {2021},
##     note = {R package version 1.0-7},
##     url = {https://CRAN.R-project.org/package=bitops},
##   }
## 
## ATTENTION: This citation information has been auto-generated from the
## package DESCRIPTION file and may need manual editing, see
## 'help("citation")'.
## 
## 
## 
## 
## [[351]]
## 
## To cite package 'blob' in publications use:
## 
##   Wickham H (2022). _blob: A Simple S3 Class for Representing Vectors
##   of Binary Data ('BLOBS')_. R package version 1.2.3,
##   <https://CRAN.R-project.org/package=blob>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {blob: A Simple S3 Class for Representing Vectors of Binary Data
## ('BLOBS')},
##     author = {Hadley Wickham},
##     year = {2022},
##     note = {R package version 1.2.3},
##     url = {https://CRAN.R-project.org/package=blob},
##   }
## 
## 
## 
## 
## [[352]]
## 
## To cite the 'bookdown' package in publications use:
## 
##   Yihui Xie (2023). bookdown: Authoring Books and Technical Documents
##   with R Markdown. R package version 0.32.
## 
##   Yihui Xie (2016). bookdown: Authoring Books and Technical Documents
##   with R Markdown. Chapman and Hall/CRC. ISBN 978-1138700109
## 
## To see these entries in BibTeX format, use 'print(<citation>,
## bibtex=TRUE)', 'toBibtex(.)', or set
## 'options(citation.bibtex.max=999)'.
## 
## 
## [[353]]
## 
## To cite the 'boot' package in publications use:
## 
##   Angelo Canty and Brian Ripley (2022). boot: Bootstrap R (S-Plus)
##   Functions. R package version 1.3-28.1.
## 
##   Davison, A. C. & Hinkley, D. V. (1997) Bootstrap Methods and Their
##   Applications. Cambridge University Press, Cambridge. ISBN
##   0-521-57391-2
## 
## To see these entries in BibTeX format, use 'print(<citation>,
## bibtex=TRUE)', 'toBibtex(.)', or set
## 'options(citation.bibtex.max=999)'.
## 
## 
## [[354]]
## 
## To cite BradleyTerry2 in publications use:
## 
##   Heather Turner, David Firth (2012). Bradley-Terry Models in R: The
##   BradleyTerry2 Package. Journal of Statistical Software, 48(9), 1-21.
##   URL https://www.jstatsoft.org/v48/i09/.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Article{,
##     title = {Bradley-Terry Models in {R}: The {BradleyTerry2} Package},
##     author = {Heather Turner and David Firth},
##     journal = {Journal of Statistical Software},
##     year = {2012},
##     volume = {48},
##     number = {9},
##     pages = {1--21},
##     url = {https://www.jstatsoft.org/v48/i09/},
##   }
## 
## 
## [[355]]
## 
## To cite package 'brew' in publications use:
## 
##   Horner J, Hunt G (2022). _brew: Templating Framework for Report
##   Generation_. R package version 1.0-8,
##   <https://CRAN.R-project.org/package=brew>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {brew: Templating Framework for Report Generation},
##     author = {Jeffrey Horner and Greg Hunt},
##     year = {2022},
##     note = {R package version 1.0-8},
##     url = {https://CRAN.R-project.org/package=brew},
##   }
## 
## 
## 
## 
## [[356]]
## 
## To cite package 'brglm' in publications use at least one of the
## following, as appropriate. The finiteness and shrinkage properties of
## the reduced-bias estimator that 'brglm' computes for logistic
## regression is in Kosmidis & Firth (2021).
## 
##   Kosmidis I (2021). _brglm: Bias Reduction in Binary-Response
##   Generalized Linear Models_. R package version 0.7.2,
##   <https://cran.r-project.org/package=brglm>.
## 
##   Kosmidis I, Firth D (2021). "Jeffreys-prior penalty, finiteness and
##   shrinkage in binomial-response generalized linear models."
##   _Biometirka_, *108*(1), 71-82.
##   <https://doi.org/10.1093/biomet/asaa052>.
## 
## To see these entries in BibTeX format, use 'print(<citation>,
## bibtex=TRUE)', 'toBibtex(.)', or set
## 'options(citation.bibtex.max=999)'.
## 
## 
## [[357]]
## 
## To cite package 'brio' in publications use:
## 
##   Hester J, Csárdi G (2021). _brio: Basic R Input Output_. R package
##   version 1.1.3, <https://CRAN.R-project.org/package=brio>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {brio: Basic R Input Output},
##     author = {Jim Hester and Gábor Csárdi},
##     year = {2021},
##     note = {R package version 1.1.3},
##     url = {https://CRAN.R-project.org/package=brio},
##   }
## 
## 
## 
## 
## [[358]]
## 
## To cite package 'broom' in publications use:
## 
##   Robinson D, Hayes A, Couch S (2023). _broom: Convert Statistical
##   Objects into Tidy Tibbles_. R package version 1.0.3,
##   <https://CRAN.R-project.org/package=broom>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {broom: Convert Statistical Objects into Tidy Tibbles},
##     author = {David Robinson and Alex Hayes and Simon Couch},
##     year = {2023},
##     note = {R package version 1.0.3},
##     url = {https://CRAN.R-project.org/package=broom},
##   }
## 
## 
## 
## 
## [[359]]
## 
## To cite package 'broom.helpers' in publications use:
## 
##   Larmarange J, Sjoberg D (2023). _broom.helpers: Helpers for Model
##   Coefficients Tibbles_. R package version 1.11.0,
##   <https://CRAN.R-project.org/package=broom.helpers>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {broom.helpers: Helpers for Model Coefficients Tibbles},
##     author = {Joseph Larmarange and Daniel D. Sjoberg},
##     year = {2023},
##     note = {R package version 1.11.0},
##     url = {https://CRAN.R-project.org/package=broom.helpers},
##   }
## 
## 
## 
## 
## [[360]]
## 
## To cite package 'broom.mixed' in publications use:
## 
##   Bolker B, Robinson D (2022). _broom.mixed: Tidying Methods for Mixed
##   Models_. R package version 0.2.9.4,
##   <https://CRAN.R-project.org/package=broom.mixed>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {broom.mixed: Tidying Methods for Mixed Models},
##     author = {Ben Bolker and David Robinson},
##     year = {2022},
##     note = {R package version 0.2.9.4},
##     url = {https://CRAN.R-project.org/package=broom.mixed},
##   }
## 
## 
## 
## 
## [[361]]
## 
## To cite package 'bslib' in publications use:
## 
##   Sievert C, Cheng J, Aden-Buie G (2023). _bslib: Custom 'Bootstrap'
##   'Sass' Themes for 'shiny' and 'rmarkdown'_. R package version 0.5.0,
##   <https://CRAN.R-project.org/package=bslib>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {bslib: Custom 'Bootstrap' 'Sass' Themes for 'shiny' and 'rmarkdown'},
##     author = {Carson Sievert and Joe Cheng and Garrick Aden-Buie},
##     year = {2023},
##     note = {R package version 0.5.0},
##     url = {https://CRAN.R-project.org/package=bslib},
##   }
## 
## 
## 
## 
## [[362]]
## 
## To cite package 'cachem' in publications use:
## 
##   Chang W (2023). _cachem: Cache R Objects with Automatic Pruning_. R
##   package version 1.0.8, <https://CRAN.R-project.org/package=cachem>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {cachem: Cache R Objects with Automatic Pruning},
##     author = {Winston Chang},
##     year = {2023},
##     note = {R package version 1.0.8},
##     url = {https://CRAN.R-project.org/package=cachem},
##   }
## 
## 
## 
## 
## [[363]]
## 
## To cite package 'callr' in publications use:
## 
##   Csárdi G, Chang W (2022). _callr: Call R from R_. R package version
##   3.7.3, <https://CRAN.R-project.org/package=callr>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {callr: Call R from R},
##     author = {Gábor Csárdi and Winston Chang},
##     year = {2022},
##     note = {R package version 3.7.3},
##     url = {https://CRAN.R-project.org/package=callr},
##   }
## 
## 
## 
## 
## [[364]]
## 
## To cite the car package in publications use:
## 
##   Fox J, Weisberg S (2019). _An R Companion to Applied Regression_,
##   Third edition. Sage, Thousand Oaks CA.
##   <https://socialsciences.mcmaster.ca/jfox/Books/Companion/>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Book{,
##     title = {An {R} Companion to Applied Regression},
##     edition = {Third},
##     author = {John Fox and Sanford Weisberg},
##     year = {2019},
##     publisher = {Sage},
##     address = {Thousand Oaks {CA}},
##     url = {https://socialsciences.mcmaster.ca/jfox/Books/Companion/},
##   }
## 
## 
## [[365]]
## 
## To cite package 'carData' in publications use:
## 
##   Fox J, Weisberg S, Price B (2022). _carData: Companion to Applied
##   Regression Data Sets_. R package version 3.0-5,
##   <https://CRAN.R-project.org/package=carData>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {carData: Companion to Applied Regression Data Sets},
##     author = {John Fox and Sanford Weisberg and Brad Price},
##     year = {2022},
##     note = {R package version 3.0-5},
##     url = {https://CRAN.R-project.org/package=carData},
##   }
## 
## 
## 
## 
## [[366]]
## 
## To cite package 'caTools' in publications use:
## 
##   Tuszynski J (2021). _caTools: Tools: Moving Window Statistics, GIF,
##   Base64, ROC AUC, etc_. R package version 1.18.2,
##   <https://CRAN.R-project.org/package=caTools>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {caTools: Tools: Moving Window Statistics, GIF, Base64, ROC AUC, etc},
##     author = {Jarek Tuszynski},
##     year = {2021},
##     note = {R package version 1.18.2},
##     url = {https://CRAN.R-project.org/package=caTools},
##   }
## 
## ATTENTION: This citation information has been auto-generated from the
## package DESCRIPTION file and may need manual editing, see
## 'help("citation")'.
## 
## 
## 
## 
## [[367]]
## 
## To cite package 'cellranger' in publications use:
## 
##   Bryan J (2016). _cellranger: Translate Spreadsheet Cell Ranges to
##   Rows and Columns_. R package version 1.1.0,
##   <https://CRAN.R-project.org/package=cellranger>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {cellranger: Translate Spreadsheet Cell Ranges to Rows and Columns},
##     author = {Jennifer Bryan},
##     year = {2016},
##     note = {R package version 1.1.0},
##     url = {https://CRAN.R-project.org/package=cellranger},
##   }
## 
## 
## 
## 
## [[368]]
## 
## To cite package 'checkmate' in publications use:
## 
##   Lang M (2017). "checkmate: Fast Argument Checks for Defensive R
##   Programming." _The R Journal_, *9*(1), 437-445.
##   doi:10.32614/RJ-2017-028 <https://doi.org/10.32614/RJ-2017-028>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Article{checkmate,
##     title = {{checkmate}: Fast Argument Checks for Defensive {R} Programming},
##     author = {Michel Lang},
##     journal = {The R Journal},
##     year = {2017},
##     doi = {10.32614/RJ-2017-028},
##     pages = {437--445},
##     volume = {9},
##     number = {1},
##   }
## 
## 
## [[369]]
## 
## To cite in publications use:
## 
##   David James and Kurt Hornik (2022). chron: Chronological Objects
##   which Can Handle Dates and Times. R package version 2.3-58.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {chron: Chronological Objects which Can Handle Dates and Times},
##     author = {David James and Kurt Hornik},
##     year = {2022},
##     note = {R package version 2.3-58. S original by David James, R port by Kurt Hornik.},
##     url = {https://CRAN.R-project.org/package=chron},
##   }
## 
## 
## [[370]]
## 
## To cite package 'Ckmeans.1d.dp' in publications use:
## 
##   Wang H, Song M (2011). "Ckmeans.1d.dp: Optimal $k$-means clustering
##   in one dimension by dynamic programming." _The R Journal_, *3*(2),
##   29-33. doi:10.32614/RJ-2011-015
##   <https://doi.org/10.32614/RJ-2011-015>.
## 
## Song M, Zhong H (2020). "Efficient weighted univariate clustering maps
## outstanding dysregulated genomic zones in human cancers."
## _Bioinformatics_, *36*(20), 5027-5036.
## doi:10.1093/bioinformatics/btaa613
## <https://doi.org/10.1093/bioinformatics/btaa613>.
## 
## To cite multi-channel weighted clustering in publications use:
## 
##   Zhong H (2019). _Model-free Gene-to-zone Network Inference of
##   Molecular Mechanisms in Biology_. Ph.D. thesis, Department of
##   Computer Science, New Mexico State University, Las Cruces, NM, USA.
## 
## To see these entries in BibTeX format, use 'print(<citation>,
## bibtex=TRUE)', 'toBibtex(.)', or set
## 'options(citation.bibtex.max=999)'.
## 
## 
## [[371]]
## 
## To cite the class package in publications use:
## 
##   Venables, W. N. & Ripley, B. D. (2002) Modern Applied Statistics with
##   S. Fourth Edition. Springer, New York. ISBN 0-387-95457-0
## 
## A BibTeX entry for LaTeX users is
## 
##   @Book{,
##     title = {Modern Applied Statistics with S},
##     author = {W. N. Venables and B. D. Ripley},
##     publisher = {Springer},
##     edition = {Fourth},
##     address = {New York},
##     year = {2002},
##     note = {ISBN 0-387-95457-0},
##     url = {https://www.stats.ox.ac.uk/pub/MASS4/},
##   }
## 
## 
## [[372]]
## 
## To cite package 'classInt' in publications use:
## 
##   Bivand R (2022). _classInt: Choose Univariate Class Intervals_. R
##   package version 0.4-8, <https://CRAN.R-project.org/package=classInt>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {classInt: Choose Univariate Class Intervals},
##     author = {Roger Bivand},
##     year = {2022},
##     note = {R package version 0.4-8},
##     url = {https://CRAN.R-project.org/package=classInt},
##   }
## 
## 
## 
## 
## [[373]]
## 
## To cite package 'cli' in publications use:
## 
##   Csárdi G (2023). _cli: Helpers for Developing Command Line
##   Interfaces_. R package version 3.6.1,
##   <https://CRAN.R-project.org/package=cli>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {cli: Helpers for Developing Command Line Interfaces},
##     author = {Gábor Csárdi},
##     year = {2023},
##     note = {R package version 3.6.1},
##     url = {https://CRAN.R-project.org/package=cli},
##   }
## 
## 
## 
## 
## [[374]]
## 
## To cite package 'clipr' in publications use:
## 
##   Lincoln M (2022). _clipr: Read and Write from the System Clipboard_.
##   R package version 0.8.0, <https://CRAN.R-project.org/package=clipr>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {clipr: Read and Write from the System Clipboard},
##     author = {Matthew Lincoln},
##     year = {2022},
##     note = {R package version 0.8.0},
##     url = {https://CRAN.R-project.org/package=clipr},
##   }
## 
## 
## 
## 
## [[375]]
## 
## To cite package 'clock' in publications use:
## 
##   Vaughan D (2022). _clock: Date-Time Types and Tools_. R package
##   version 0.6.1, <https://CRAN.R-project.org/package=clock>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {clock: Date-Time Types and Tools},
##     author = {Davis Vaughan},
##     year = {2022},
##     note = {R package version 0.6.1},
##     url = {https://CRAN.R-project.org/package=clock},
##   }
## 
## 
## 
## 
## [[376]]
## 
## To cite the R package 'cluster' in publications use:
## 
##   Maechler, M., Rousseeuw, P., Struyf, A., Hubert, M., Hornik,
##   K.(2022).  cluster: Cluster Analysis Basics and Extensions. R package
##   version 2.1.4.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {cluster: Cluster Analysis Basics and Extensions},
##     author = {Martin Maechler and Peter Rousseeuw and Anja Struyf and Mia Hubert and Kurt Hornik},
##     year = {2022},
##     url = {https://CRAN.R-project.org/package=cluster},
##     note = {R package version 2.1.4 --- For new features, see the 'Changelog' file (in the package source)},
##   }
## 
## 
## [[377]]
## 
## To cite package coda in publications use:
## 
##   Martyn Plummer, Nicky Best, Kate Cowles and Karen Vines (2006). CODA:
##   Convergence Diagnosis and Output Analysis for MCMC, R News, vol 6,
##   7-11
## 
## A BibTeX entry for LaTeX users is
## 
##   @Article{,
##     title = {CODA: Convergence Diagnosis and Output Analysis for MCMC},
##     author = {Martyn Plummer and Nicky Best and Kate Cowles and Karen Vines},
##     journal = {R News},
##     year = {2006},
##     volume = {6},
##     number = {1},
##     pages = {7--11},
##     url = {https://journal.r-project.org/archive/},
##     pdf = {https://www.r-project.org/doc/Rnews/Rnews_2006-1.pdf},
##   }
## 
## 
## [[378]]
## 
## To cite package 'codetools' in publications use:
## 
##   Tierney L (2020). _codetools: Code Analysis Tools for R_. R package
##   version 0.2-18, <https://CRAN.R-project.org/package=codetools>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {codetools: Code Analysis Tools for R},
##     author = {Luke Tierney},
##     year = {2020},
##     note = {R package version 0.2-18},
##     url = {https://CRAN.R-project.org/package=codetools},
##   }
## 
## ATTENTION: This citation information has been auto-generated from the
## package DESCRIPTION file and may need manual editing, see
## 'help("citation")'.
## 
## 
## 
## 
## [[379]]
## 
## Use the following references when citing the 'coin' package in
## publications:
## 
##   Hothorn T, Hornik K, van de Wiel MA, Zeileis A (2006). "A Lego system
##   for conditional inference." _The American Statistician_, *60*(3),
##   257-263. doi:10.1198/000313006X118430
##   <https://doi.org/10.1198/000313006X118430>.
## 
## for the implemented theoretical framework and/or
## 
## Hothorn T, Hornik K, van de Wiel MA, Zeileis A (2008). "Implementing a
## class of permutation tests: The coin package." _Journal of Statistical
## Software_, *28*(8), 1-23. doi:10.18637/jss.v028.i08
## <https://doi.org/10.18637/jss.v028.i08>.
## 
## for the implementation approach.
## 
## To see these entries in BibTeX format, use 'print(<citation>,
## bibtex=TRUE)', 'toBibtex(.)', or set
## 'options(citation.bibtex.max=999)'.
## 
## 
## [[380]]
## 
## To cite package 'collapse' in publications use:
## 
##   Krantz S (2022). _collapse: Advanced and Fast Data Transformation_. R
##   package version 1.8.9, <https://CRAN.R-project.org/package=collapse>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {collapse: Advanced and Fast Data Transformation},
##     author = {Sebastian Krantz},
##     year = {2022},
##     note = {R package version 1.8.9},
##     url = {https://CRAN.R-project.org/package=collapse},
##   }
## 
## 
## 
## 
## [[381]]
## 
## To cite colorspace in publications use:
## 
##   Zeileis A, Fisher JC, Hornik K, Ihaka R, McWhite CD, Murrell P,
##   Stauffer R, Wilke CO (2020). "colorspace: A Toolbox for Manipulating
##   and Assessing Colors and Palettes." _Journal of Statistical
##   Software_, *96*(1), 1-49. doi:10.18637/jss.v096.i01
##   <https://doi.org/10.18637/jss.v096.i01>.
## 
## If you use HCL-based color palettes, please cite:
## 
##   Zeileis A, Hornik K, Murrell P (2009). "Escaping RGBland: Selecting
##   Colors for Statistical Graphics." _Computational Statistics \& Data
##   Analysis_, *53*(9), 3259-3270. doi:10.1016/j.csda.2008.11.033
##   <https://doi.org/10.1016/j.csda.2008.11.033>.
## 
## If you use HCL-based color palettes in meteorological visualizations,
## please cite:
## 
##   Stauffer R, Mayr GJ, Dabernig M, Zeileis A (2009). "Somewhere over
##   the Rainbow: How to Make Effective Use of Colors in Meteorological
##   Visualizations." _Bulletin of the American Meteorological Society_,
##   *96*(2), 203-216. doi:10.1175/BAMS-D-13-00155.1
##   <https://doi.org/10.1175/BAMS-D-13-00155.1>.
## 
## To see these entries in BibTeX format, use 'print(<citation>,
## bibtex=TRUE)', 'toBibtex(.)', or set
## 'options(citation.bibtex.max=999)'.
## 
## 
## [[382]]
## 
## To cite package 'colourpicker' in publications use:
## 
##   Attali D (2022). _colourpicker: A Colour Picker Tool for Shiny and
##   for Selecting Colours in Plots_. R package version 1.2.0,
##   <https://CRAN.R-project.org/package=colourpicker>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {colourpicker: A Colour Picker Tool for Shiny and for Selecting Colours in
## Plots},
##     author = {Dean Attali},
##     year = {2022},
##     note = {R package version 1.2.0},
##     url = {https://CRAN.R-project.org/package=colourpicker},
##   }
## 
## 
## 
## 
## [[383]]
## 
## To cite package 'combinat' in publications use:
## 
##   Chasalow S (2012). _combinat: combinatorics utilities_. R package
##   version 0.0-8, <https://CRAN.R-project.org/package=combinat>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {combinat: combinatorics utilities},
##     author = {Scott Chasalow},
##     year = {2012},
##     note = {R package version 0.0-8},
##     url = {https://CRAN.R-project.org/package=combinat},
##   }
## 
## ATTENTION: This citation information has been auto-generated from the
## package DESCRIPTION file and may need manual editing, see
## 'help("citation")'.
## 
## 
## 
## 
## [[384]]
## 
## To cite package 'commonmark' in publications use:
## 
##   Ooms J (2023). _commonmark: High Performance CommonMark and Github
##   Markdown Rendering in R_. R package version 1.9.0,
##   <https://CRAN.R-project.org/package=commonmark>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {commonmark: High Performance CommonMark and Github Markdown Rendering in R},
##     author = {Jeroen Ooms},
##     year = {2023},
##     note = {R package version 1.9.0},
##     url = {https://CRAN.R-project.org/package=commonmark},
##   }
## 
## 
## 
## 
## [[385]]
## 
## The 'compiler' package is part of R.  To cite R in publications use:
## 
##   R Core Team (2022). R: A language and environment for statistical
##   computing. R Foundation for Statistical Computing, Vienna, Austria.
##   URL https://www.R-project.org/.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {R: A Language and Environment for Statistical Computing},
##     author = {{R Core Team}},
##     organization = {R Foundation for Statistical Computing},
##     address = {Vienna, Austria},
##     year = {2022},
##     url = {https://www.R-project.org/},
##   }
## 
## We have invested a lot of time and effort in creating R, please cite it
## when using it for data analysis. See also 'citation("pkgname")' for
## citing R packages.
## 
## 
## [[386]]
## 
## To cite package 'conflicted' in publications use:
## 
##   Wickham H (2023). _conflicted: An Alternative Conflict Resolution
##   Strategy_. R package version 1.2.0,
##   <https://CRAN.R-project.org/package=conflicted>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {conflicted: An Alternative Conflict Resolution Strategy},
##     author = {Hadley Wickham},
##     year = {2023},
##     note = {R package version 1.2.0},
##     url = {https://CRAN.R-project.org/package=conflicted},
##   }
## 
## 
## 
## 
## [[387]]
## 
## To cite package 'corpcor' in publications use:
## 
##   Schafer J, Opgen-Rhein R, Zuber V, Ahdesmaki M, Silva APD, Strimmer.
##   K (2021). _corpcor: Efficient Estimation of Covariance and (Partial)
##   Correlation_. R package version 1.6.10,
##   <https://CRAN.R-project.org/package=corpcor>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {corpcor: Efficient Estimation of Covariance and (Partial) Correlation},
##     author = {Juliane Schafer and Rainer Opgen-Rhein and Verena Zuber and Miika Ahdesmaki and A. Pedro Duarte Silva and Korbinian Strimmer.},
##     year = {2021},
##     note = {R package version 1.6.10},
##     url = {https://CRAN.R-project.org/package=corpcor},
##   }
## 
## ATTENTION: This citation information has been auto-generated from the
## package DESCRIPTION file and may need manual editing, see
## 'help("citation")'.
## 
## 
## 
## 
## [[388]]
## 
## To cite corrplot in publications use:
## 
##   Taiyun Wei and Viliam Simko (2021). R package 'corrplot':
##   Visualization of a Correlation Matrix (Version 0.92). Available from
##   https://github.com/taiyun/corrplot
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{corrplot2021,
##     title = {R package 'corrplot': Visualization of a Correlation Matrix},
##     author = {Taiyun Wei and Viliam Simko},
##     year = {2021},
##     note = {(Version 0.92)},
##     url = {https://github.com/taiyun/corrplot},
##   }
## 
## 
## [[389]]
## 
## To cite package 'covr' in publications use:
## 
##   Hester J (2022). _covr: Test Coverage for Packages_. R package
##   version 3.6.1, <https://CRAN.R-project.org/package=covr>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {covr: Test Coverage for Packages},
##     author = {Jim Hester},
##     year = {2022},
##     note = {R package version 3.6.1},
##     url = {https://CRAN.R-project.org/package=covr},
##   }
## 
## 
## 
## 
## [[390]]
## 
## To cite package 'covTest' in publications use:
## 
##   Lockhart R, Taylor J, Tibshirani R, Tibshirani R (2013). _covTest:
##   Computes covariance test for adaptive linear modelling_. R package
##   version 1.02, <https://CRAN.R-project.org/package=covTest>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {covTest: Computes covariance test for adaptive linear modelling},
##     author = {Richard Lockhart and Jon Taylor and Ryan Tibshirani and Rob Tibshirani},
##     year = {2013},
##     note = {R package version 1.02},
##     url = {https://CRAN.R-project.org/package=covTest},
##   }
## 
## ATTENTION: This citation information has been auto-generated from the
## package DESCRIPTION file and may need manual editing, see
## 'help("citation")'.
## 
## 
## 
## 
## [[391]]
## 
## To cite package 'cowplot' in publications use:
## 
##   Wilke C (2020). _cowplot: Streamlined Plot Theme and Plot Annotations
##   for 'ggplot2'_. R package version 1.1.1,
##   <https://CRAN.R-project.org/package=cowplot>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {cowplot: Streamlined Plot Theme and Plot Annotations for 'ggplot2'},
##     author = {Claus O. Wilke},
##     year = {2020},
##     note = {R package version 1.1.1},
##     url = {https://CRAN.R-project.org/package=cowplot},
##   }
## 
## 
## 
## 
## [[392]]
## 
## To cite package 'cpp11' in publications use:
## 
##   Vaughan D, Hester J, François R (2023). _cpp11: A C++11 Interface for
##   R's C Interface_. R package version 0.4.6,
##   <https://CRAN.R-project.org/package=cpp11>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {cpp11: A C++11 Interface for R's C Interface},
##     author = {Davis Vaughan and Jim Hester and Romain François},
##     year = {2023},
##     note = {R package version 0.4.6},
##     url = {https://CRAN.R-project.org/package=cpp11},
##   }
## 
## 
## 
## 
## [[393]]
## 
## To cite package 'crayon' in publications use:
## 
##   Csárdi G (2022). _crayon: Colored Terminal Output_. R package version
##   1.5.2, <https://CRAN.R-project.org/package=crayon>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {crayon: Colored Terminal Output},
##     author = {Gábor Csárdi},
##     year = {2022},
##     note = {R package version 1.5.2},
##     url = {https://CRAN.R-project.org/package=crayon},
##   }
## 
## 
## 
## 
## [[394]]
## 
## To cite package 'credentials' in publications use:
## 
##   Ooms J (2021). _credentials: Tools for Managing SSH and Git
##   Credentials_. R package version 1.3.2,
##   <https://CRAN.R-project.org/package=credentials>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {credentials: Tools for Managing SSH and Git Credentials},
##     author = {Jeroen Ooms},
##     year = {2021},
##     note = {R package version 1.3.2},
##     url = {https://CRAN.R-project.org/package=credentials},
##   }
## 
## 
## 
## 
## [[395]]
## 
## To cite package 'crosstable' in publications use:
## 
##   Chaltiel D (2023). _crosstable: Crosstables for Descriptive
##   Analyses_. R package version 0.6.2,
##   <https://CRAN.R-project.org/package=crosstable>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {crosstable: Crosstables for Descriptive Analyses},
##     author = {Dan Chaltiel},
##     year = {2023},
##     note = {R package version 0.6.2},
##     url = {https://CRAN.R-project.org/package=crosstable},
##   }
## 
## 
## 
## 
## [[396]]
## 
## To cite package 'crosstalk' in publications use:
## 
##   Cheng J, Sievert C (2021). _crosstalk: Inter-Widget Interactivity for
##   HTML Widgets_. R package version 1.2.0,
##   <https://CRAN.R-project.org/package=crosstalk>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {crosstalk: Inter-Widget Interactivity for HTML Widgets},
##     author = {Joe Cheng and Carson Sievert},
##     year = {2021},
##     note = {R package version 1.2.0},
##     url = {https://CRAN.R-project.org/package=crosstalk},
##   }
## 
## 
## 
## 
## [[397]]
## 
## To cite package 'crul' in publications use:
## 
##   Chamberlain S (2022). _crul: HTTP Client_. R package version 1.3,
##   <https://CRAN.R-project.org/package=crul>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {crul: HTTP Client},
##     author = {Scott Chamberlain},
##     year = {2022},
##     note = {R package version 1.3},
##     url = {https://CRAN.R-project.org/package=crul},
##   }
## 
## 
## 
## 
## [[398]]
## 
## To cite package 'cubature' in publications use:
## 
##   Narasimhan B, Johnson SG, Hahn T, Bouvier A, Kiêu K (2023).
##   _cubature: Adaptive Multivariate Integration over Hypercubes_. R
##   package version 2.1.0, <https://CRAN.R-project.org/package=cubature>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {cubature: Adaptive Multivariate Integration over Hypercubes},
##     author = {Balasubramanian Narasimhan and Steven G. Johnson and Thomas Hahn and Annie Bouvier and Kiên Kiêu},
##     year = {2023},
##     note = {R package version 2.1.0},
##     url = {https://CRAN.R-project.org/package=cubature},
##   }
## 
## 
## 
## 
## [[399]]
## 
## To cite package 'Cubist' in publications use:
## 
##   Kuhn M, Quinlan R (2022). _Cubist: Rule- And Instance-Based
##   Regression Modeling_. R package version 0.4.1,
##   <https://CRAN.R-project.org/package=Cubist>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {Cubist: Rule- And Instance-Based Regression Modeling},
##     author = {Max Kuhn and Ross Quinlan},
##     year = {2022},
##     note = {R package version 0.4.1},
##     url = {https://CRAN.R-project.org/package=Cubist},
##   }
## 
## 
## 
## 
## [[400]]
## 
## To cite package 'curl' in publications use:
## 
##   Ooms J (2023). _curl: A Modern and Flexible Web Client for R_. R
##   package version 5.1.0, <https://CRAN.R-project.org/package=curl>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {curl: A Modern and Flexible Web Client for R},
##     author = {Jeroen Ooms},
##     year = {2023},
##     note = {R package version 5.1.0},
##     url = {https://CRAN.R-project.org/package=curl},
##   }
## 
## 
## 
## 
## [[401]]
## 
## To cite package 'cyclocomp' in publications use:
## 
##   Csardi G (2016). _cyclocomp: Cyclomatic Complexity of R Code_. R
##   package version 1.1.0,
##   <https://CRAN.R-project.org/package=cyclocomp>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {cyclocomp: Cyclomatic Complexity of R Code},
##     author = {Gabor Csardi},
##     year = {2016},
##     note = {R package version 1.1.0},
##     url = {https://CRAN.R-project.org/package=cyclocomp},
##   }
## 
## ATTENTION: This citation information has been auto-generated from the
## package DESCRIPTION file and may need manual editing, see
## 'help("citation")'.
## 
## 
## 
## 
## [[402]]
## 
## To cite package 'data.table' in publications use:
## 
##   Dowle M, Srinivasan A (2022). _data.table: Extension of
##   `data.frame`_. R package version 1.14.6,
##   <https://CRAN.R-project.org/package=data.table>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {data.table: Extension of `data.frame`},
##     author = {Matt Dowle and Arun Srinivasan},
##     year = {2022},
##     note = {R package version 1.14.6},
##     url = {https://CRAN.R-project.org/package=data.table},
##   }
## 
## 
## 
## 
## [[403]]
## 
## To cite package 'datamods' in publications use:
## 
##   Perrier V, Meyer F, Goumri S, Abeer Z (2023). _datamods: Modules to
##   Import and Manipulate Data in 'Shiny'_. R package version 1.4.1,
##   <https://CRAN.R-project.org/package=datamods>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {datamods: Modules to Import and Manipulate Data in 'Shiny'},
##     author = {Victor Perrier and Fanny Meyer and Samra Goumri and Zauad Shahreer Abeer},
##     year = {2023},
##     note = {R package version 1.4.1},
##     url = {https://CRAN.R-project.org/package=datamods},
##   }
## 
## 
## 
## 
## [[404]]
## 
## The 'datasets' package is part of R.  To cite R in publications use:
## 
##   R Core Team (2022). R: A language and environment for statistical
##   computing. R Foundation for Statistical Computing, Vienna, Austria.
##   URL https://www.R-project.org/.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {R: A Language and Environment for Statistical Computing},
##     author = {{R Core Team}},
##     organization = {R Foundation for Statistical Computing},
##     address = {Vienna, Austria},
##     year = {2022},
##     url = {https://www.R-project.org/},
##   }
## 
## We have invested a lot of time and effort in creating R, please cite it
## when using it for data analysis. See also 'citation("pkgname")' for
## citing R packages.
## 
## 
## [[405]]
## 
## To cite package 'datawizard' in publications use:
## 
##   Patil et al., (2022). datawizard: An R Package for Easy Data
##   Preparation and Statistical Transformations. Journal of Open Source
##   Software, 7(78), 4684, https://doi.org/10.21105/joss.04684
## 
## A BibTeX entry for LaTeX users is
## 
##   @Article{,
##     title = {{datawizard}: An {R} Package for Easy Data Preparation and Statistical Transformations},
##     author = {Indrajeet Patil and Dominique Makowski and Mattan S. Ben-Shachar and Brenton M. Wiernik and Etienne Bacher and Daniel Lüdecke},
##     journal = {Journal of Open Source Software},
##     year = {2022},
##     volume = {7},
##     number = {78},
##     pages = {4684},
##     doi = {10.21105/joss.04684},
##   }
## 
## 
## [[406]]
## 
## To cite package 'DBI' in publications use:
## 
##   R Special Interest Group on Databases (R-SIG-DB), Wickham H, Müller K
##   (2022). _DBI: R Database Interface_. R package version 1.1.3,
##   <https://CRAN.R-project.org/package=DBI>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {DBI: R Database Interface},
##     author = {{R Special Interest Group on Databases (R-SIG-DB)} and Hadley Wickham and Kirill Müller},
##     year = {2022},
##     note = {R package version 1.1.3},
##     url = {https://CRAN.R-project.org/package=DBI},
##   }
## 
## 
## 
## 
## [[407]]
## 
## To cite package 'dbplyr' in publications use:
## 
##   Wickham H, Girlich M, Ruiz E (2023). _dbplyr: A 'dplyr' Back End for
##   Databases_. R package version 2.3.0,
##   <https://CRAN.R-project.org/package=dbplyr>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {dbplyr: A 'dplyr' Back End for Databases},
##     author = {Hadley Wickham and Maximilian Girlich and Edgar Ruiz},
##     year = {2023},
##     note = {R package version 2.3.0},
##     url = {https://CRAN.R-project.org/package=dbplyr},
##   }
## 
## 
## 
## 
## [[408]]
## 
## To cite package 'deldir' in publications use:
## 
##   Turner R (2021). _deldir: Delaunay Triangulation and Dirichlet
##   (Voronoi) Tessellation_. R package version 1.0-6,
##   <https://CRAN.R-project.org/package=deldir>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {deldir: Delaunay Triangulation and Dirichlet (Voronoi) Tessellation},
##     author = {Rolf Turner},
##     year = {2021},
##     note = {R package version 1.0-6},
##     url = {https://CRAN.R-project.org/package=deldir},
##   }
## 
## ATTENTION: This citation information has been auto-generated from the
## package DESCRIPTION file and may need manual editing, see
## 'help("citation")'.
## 
## 
## 
## 
## [[409]]
## 
## To cite package 'DEoptimR' in publications use:
## 
##   Conceicao EL (2022). _DEoptimR: Differential Evolution Optimization
##   in Pure R_. R package version 1.0-11,
##   <https://CRAN.R-project.org/package=DEoptimR>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {DEoptimR: Differential Evolution Optimization in Pure R},
##     author = {Eduardo L. T. Conceicao},
##     year = {2022},
##     note = {R package version 1.0-11},
##     url = {https://CRAN.R-project.org/package=DEoptimR},
##   }
## 
## 
## 
## 
## [[410]]
## 
## To cite package 'Deriv' in publications use:
## 
##   Clausen A, Sokol S (2020). _Deriv: R-based Symbolic Differentiation_.
##   Deriv package version 4.1,
##   <https://CRAN.R-project.org/package=Deriv>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {{Deriv}: R-based Symbolic Differentiation},
##     author = {Andrew Clausen and Serguei Sokol},
##     year = {2020},
##     note = {Deriv package version 4.1},
##     url = {https://CRAN.R-project.org/package=Deriv},
##   }
## 
## 
## [[411]]
## 
## To cite package 'desc' in publications use:
## 
##   Csárdi G, Müller K, Hester J (2022). _desc: Manipulate DESCRIPTION
##   Files_. R package version 1.4.2,
##   <https://CRAN.R-project.org/package=desc>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {desc: Manipulate DESCRIPTION Files},
##     author = {Gábor Csárdi and Kirill Müller and Jim Hester},
##     year = {2022},
##     note = {R package version 1.4.2},
##     url = {https://CRAN.R-project.org/package=desc},
##   }
## 
## 
## 
## 
## [[412]]
## 
## To cite package 'devtools' in publications use:
## 
##   Wickham H, Hester J, Chang W, Bryan J (2022). _devtools: Tools to
##   Make Developing R Packages Easier_. R package version 2.4.5,
##   <https://CRAN.R-project.org/package=devtools>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {devtools: Tools to Make Developing R Packages Easier},
##     author = {Hadley Wickham and Jim Hester and Winston Chang and Jennifer Bryan},
##     year = {2022},
##     note = {R package version 2.4.5},
##     url = {https://CRAN.R-project.org/package=devtools},
##   }
## 
## 
## 
## 
## [[413]]
## 
## To cite package 'DiagrammeR' in publications use:
## 
##   Iannone R (2022). _DiagrammeR: Graph/Network Visualization_. R
##   package version 1.0.9,
##   <https://CRAN.R-project.org/package=DiagrammeR>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {DiagrammeR: Graph/Network Visualization},
##     author = {Richard Iannone},
##     year = {2022},
##     note = {R package version 1.0.9},
##     url = {https://CRAN.R-project.org/package=DiagrammeR},
##   }
## 
## 
## 
## 
## [[414]]
## 
## To cite package 'dials' in publications use:
## 
##   Kuhn M, Frick H (2022). _dials: Tools for Creating Tuning Parameter
##   Values_. R package version 1.1.0,
##   <https://CRAN.R-project.org/package=dials>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {dials: Tools for Creating Tuning Parameter Values},
##     author = {Max Kuhn and Hannah Frick},
##     year = {2022},
##     note = {R package version 1.1.0},
##     url = {https://CRAN.R-project.org/package=dials},
##   }
## 
## 
## 
## 
## [[415]]
## 
## To cite DiceDesign and DiceEval in publications use:
## 
##   Delphine Dupuy, Celine Helbert, Jessica Franco (2015). DiceDesign and
##   DiceEval: Two R Packages for Design and Analysis of Computer
##   Experiments. Journal of Statistical Software, 65(11), 1-38. URL
##   https://www.jstatsoft.org/v65/i11/
## 
## A BibTeX entry for LaTeX users is
## 
##   @Article{,
##     title = {{DiceDesign} and {DiceEval}: Two {R} Packages for Design and Analysis of Computer Experiments},
##     author = {Delphine Dupuy and C{\'e}line Helbert and Jessica Franco},
##     journal = {Journal of Statistical Software},
##     year = {2015},
##     volume = {65},
##     number = {11},
##     pages = {1--38},
##     url = {https://www.jstatsoft.org/v65/i11/},
##   }
## 
## 
## [[416]]
## 
## To cite package 'diffobj' in publications use:
## 
##   Gaslam B (2021). _diffobj: Diffs for R Objects_. R package version
##   0.3.5, <https://CRAN.R-project.org/package=diffobj>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {diffobj: Diffs for R Objects},
##     author = {Brodie Gaslam},
##     year = {2021},
##     note = {R package version 0.3.5},
##     url = {https://CRAN.R-project.org/package=diffobj},
##   }
## 
## 
## 
## 
## [[417]]
## 
## To cite package 'digest' in publications use:
## 
##   Lucas DEwcbA, Tuszynski J, Bengtsson H, Urbanek S, Frasca M, Lewis B,
##   Stokely M, Muehleisen H, Murdoch D, Hester J, Wu W, Kou Q, Onkelinx
##   T, Lang M, Simko V, Hornik K, Neal R, Bell K, de Queljoe M, Suruceanu
##   I, Denney B, Schumacher D, Chang W, Attali. D (2023). _digest: Create
##   Compact Hash Digests of R Objects_. R package version 0.6.33,
##   <https://CRAN.R-project.org/package=digest>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {digest: Create Compact Hash Digests of R Objects},
##     author = {Dirk Eddelbuettel with contributions by Antoine Lucas and Jarek Tuszynski and Henrik Bengtsson and Simon Urbanek and Mario Frasca and Bryan Lewis and Murray Stokely and Hannes Muehleisen and Duncan Murdoch and Jim Hester and Wush Wu and Qiang Kou and Thierry Onkelinx and Michel Lang and Viliam Simko and Kurt Hornik and Radford Neal and Kendon Bell and Matthew {de Queljoe} and Ion Suruceanu and Bill Denney and Dirk Schumacher and Winston Chang and Dean Attali.},
##     year = {2023},
##     note = {R package version 0.6.33},
##     url = {https://CRAN.R-project.org/package=digest},
##   }
## 
## ATTENTION: This citation information has been auto-generated from the
## package DESCRIPTION file and may need manual editing, see
## 'help("citation")'.
## 
## 
## 
## 
## [[418]]
## 
## To cite package 'directlabels' in publications use:
## 
##   Hocking TD (2021). _directlabels: Direct Labels for Multicolor
##   Plots_. R package version 2021.1.13,
##   <https://CRAN.R-project.org/package=directlabels>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {directlabels: Direct Labels for Multicolor Plots},
##     author = {Toby Dylan Hocking},
##     year = {2021},
##     note = {R package version 2021.1.13},
##     url = {https://CRAN.R-project.org/package=directlabels},
##   }
## 
## ATTENTION: This citation information has been auto-generated from the
## package DESCRIPTION file and may need manual editing, see
## 'help("citation")'.
## 
## 
## 
## 
## [[419]]
## 
## To cite DMwR2 in publications use:
## 
##   Torgo, L. (2016). Data Mining with R, learning with case studies, 2nd
##   editionChapman and Hall/CRC. URL: http://ltorgo.github.io/DMwR2
## 
## A BibTeX entry for LaTeX users is
## 
##   @Book{,
##     title = {Data Mining with R, learning with case studies, 2nd edition},
##     author = {L. Torgo},
##     publisher = {Chapman and Hall/CRC},
##     year = {2016},
##     url = {http://ltorgo.github.io/DMwR2},
##   }
## 
## 
## [[420]]
## 
## To cite package 'doMC' in publications use:
## 
##   Analytics R, Weston S (2022). _doMC: Foreach Parallel Adaptor for
##   'parallel'_. R package version 1.3.8,
##   <https://CRAN.R-project.org/package=doMC>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {doMC: Foreach Parallel Adaptor for 'parallel'},
##     author = {Revolution Analytics and Steve Weston},
##     year = {2022},
##     note = {R package version 1.3.8},
##     url = {https://CRAN.R-project.org/package=doMC},
##   }
## 
## 
## 
## 
## [[421]]
## 
## To cite package 'doParallel' in publications use:
## 
##   Corporation M, Weston S (2022). _doParallel: Foreach Parallel Adaptor
##   for the 'parallel' Package_. R package version 1.0.17,
##   <https://CRAN.R-project.org/package=doParallel>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {doParallel: Foreach Parallel Adaptor for the 'parallel' Package},
##     author = {Microsoft Corporation and Steve Weston},
##     year = {2022},
##     note = {R package version 1.0.17},
##     url = {https://CRAN.R-project.org/package=doParallel},
##   }
## 
## 
## 
## 
## [[422]]
## 
## To cite package 'downlit' in publications use:
## 
##   Wickham H (2022). _downlit: Syntax Highlighting and Automatic
##   Linking_. R package version 0.4.2,
##   <https://CRAN.R-project.org/package=downlit>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {downlit: Syntax Highlighting and Automatic Linking},
##     author = {Hadley Wickham},
##     year = {2022},
##     note = {R package version 0.4.2},
##     url = {https://CRAN.R-project.org/package=downlit},
##   }
## 
## 
## 
## 
## [[423]]
## 
## To cite package 'downloader' in publications use:
## 
##   Chang W (2015). _downloader: Download Files over HTTP and HTTPS_. R
##   package version 0.4, <https://CRAN.R-project.org/package=downloader>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {downloader: Download Files over HTTP and HTTPS},
##     author = {Winston Chang},
##     year = {2015},
##     note = {R package version 0.4},
##     url = {https://CRAN.R-project.org/package=downloader},
##   }
## 
## ATTENTION: This citation information has been auto-generated from the
## package DESCRIPTION file and may need manual editing, see
## 'help("citation")'.
## 
## 
## 
## 
## [[424]]
## 
## To cite package 'dplyr' in publications use:
## 
##   Wickham H, François R, Henry L, Müller K, Vaughan D (2023). _dplyr: A
##   Grammar of Data Manipulation_. R package version 1.1.4,
##   <https://CRAN.R-project.org/package=dplyr>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {dplyr: A Grammar of Data Manipulation},
##     author = {Hadley Wickham and Romain François and Lionel Henry and Kirill Müller and Davis Vaughan},
##     year = {2023},
##     note = {R package version 1.1.4},
##     url = {https://CRAN.R-project.org/package=dplyr},
##   }
## 
## 
## 
## 
## [[425]]
## 
## To cite package 'DT' in publications use:
## 
##   Xie Y, Cheng J, Tan X (2023). _DT: A Wrapper of the JavaScript
##   Library 'DataTables'_. R package version 0.27,
##   <https://CRAN.R-project.org/package=DT>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {DT: A Wrapper of the JavaScript Library 'DataTables'},
##     author = {Yihui Xie and Joe Cheng and Xianying Tan},
##     year = {2023},
##     note = {R package version 0.27},
##     url = {https://CRAN.R-project.org/package=DT},
##   }
## 
## 
## 
## 
## [[426]]
## 
## To cite package 'dtplyr' in publications use:
## 
##   Wickham H, Girlich M, Fairbanks M, Dickerson R (2022). _dtplyr: Data
##   Table Back-End for 'dplyr'_. R package version 1.2.2,
##   <https://CRAN.R-project.org/package=dtplyr>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {dtplyr: Data Table Back-End for 'dplyr'},
##     author = {Hadley Wickham and Maximilian Girlich and Mark Fairbanks and Ryan Dickerson},
##     year = {2022},
##     note = {R package version 1.2.2},
##     url = {https://CRAN.R-project.org/package=dtplyr},
##   }
## 
## 
## 
## 
## [[427]]
## 
## To cite package 'dygraphs' in publications use:
## 
##   Vanderkam D, Allaire J, Owen J, Gromer D, Thieurmel B (2018).
##   _dygraphs: Interface to 'Dygraphs' Interactive Time Series Charting
##   Library_. R package version 1.1.1.6,
##   <https://CRAN.R-project.org/package=dygraphs>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {dygraphs: Interface to 'Dygraphs' Interactive Time Series Charting Library},
##     author = {Dan Vanderkam and JJ Allaire and Jonathan Owen and Daniel Gromer and Benoit Thieurmel},
##     year = {2018},
##     note = {R package version 1.1.1.6},
##     url = {https://CRAN.R-project.org/package=dygraphs},
##   }
## 
## 
## 
## 
## [[428]]
## 
## To cite package 'e1071' in publications use:
## 
##   Meyer D, Dimitriadou E, Hornik K, Weingessel A, Leisch F (2023).
##   _e1071: Misc Functions of the Department of Statistics, Probability
##   Theory Group (Formerly: E1071), TU Wien_. R package version 1.7-13,
##   <https://CRAN.R-project.org/package=e1071>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {e1071: Misc Functions of the Department of Statistics, Probability
## Theory Group (Formerly: E1071), TU Wien},
##     author = {David Meyer and Evgenia Dimitriadou and Kurt Hornik and Andreas Weingessel and Friedrich Leisch},
##     year = {2023},
##     note = {R package version 1.7-13},
##     url = {https://CRAN.R-project.org/package=e1071},
##   }
## 
## 
## 
## 
## [[429]]
## 
## To cite package 'earth' in publications use:
## 
##   Hastie SMDfmbT, wrapper. RTUAMFuwTLl (2021). _earth: Multivariate
##   Adaptive Regression Splines_. R package version 5.3.1,
##   <https://CRAN.R-project.org/package=earth>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {earth: Multivariate Adaptive Regression Splines},
##     author = {Stephen Milborrow. Derived from mda:mars by Trevor Hastie and Rob Tibshirani. Uses Alan Miller's Fortran utilities with Thomas Lumley's leaps wrapper.},
##     year = {2021},
##     note = {R package version 5.3.1},
##     url = {https://CRAN.R-project.org/package=earth},
##   }
## 
## ATTENTION: This citation information has been auto-generated from the
## package DESCRIPTION file and may need manual editing, see
## 'help("citation")'.
## 
## 
## 
## 
## [[430]]
## 
## To cite package 'ellipse' in publications use:
## 
##   Murdoch D, Chow ED (2022). _ellipse: Functions for Drawing Ellipses
##   and Ellipse-Like Confidence Regions_. R package version 0.4.3,
##   <https://CRAN.R-project.org/package=ellipse>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {ellipse: Functions for Drawing Ellipses and Ellipse-Like Confidence
## Regions},
##     author = {Duncan Murdoch and E. D. Chow},
##     year = {2022},
##     note = {R package version 0.4.3},
##     url = {https://CRAN.R-project.org/package=ellipse},
##   }
## 
## ATTENTION: This citation information has been auto-generated from the
## package DESCRIPTION file and may need manual editing, see
## 'help("citation")'.
## 
## 
## 
## 
## [[431]]
## 
## To cite package 'ellipsis' in publications use:
## 
##   Wickham H (2021). _ellipsis: Tools for Working with ..._. R package
##   version 0.3.2, <https://CRAN.R-project.org/package=ellipsis>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {ellipsis: Tools for Working with ...},
##     author = {Hadley Wickham},
##     year = {2021},
##     note = {R package version 0.3.2},
##     url = {https://CRAN.R-project.org/package=ellipsis},
##   }
## 
## 
## 
## 
## [[432]]
## 
## To cite package 'emmeans' in publications use:
## 
##   Lenth R (2023). _emmeans: Estimated Marginal Means, aka Least-Squares
##   Means_. R package version 1.8.4-1,
##   <https://CRAN.R-project.org/package=emmeans>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {emmeans: Estimated Marginal Means, aka Least-Squares Means},
##     author = {Russell V. Lenth},
##     year = {2023},
##     note = {R package version 1.8.4-1},
##     url = {https://CRAN.R-project.org/package=emmeans},
##   }
## 
## 
## 
## 
## [[433]]
## 
## To cite package 'entropy' in publications use:
## 
##   Hausser J, Strimmer K (2021). _entropy: Estimation of Entropy, Mutual
##   Information and Related Quantities_. R package version 1.3.1,
##   <https://CRAN.R-project.org/package=entropy>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {entropy: Estimation of Entropy, Mutual Information and Related Quantities},
##     author = {Jean Hausser and Korbinian Strimmer},
##     year = {2021},
##     note = {R package version 1.3.1},
##     url = {https://CRAN.R-project.org/package=entropy},
##   }
## 
## ATTENTION: This citation information has been auto-generated from the
## package DESCRIPTION file and may need manual editing, see
## 'help("citation")'.
## 
## 
## 
## 
## [[434]]
## 
## To cite package 'epiDisplay' in publications use:
## 
##   Chongsuvivatwong V (2022). _epiDisplay: Epidemiological Data Display
##   Package_. R package version 3.5.0.2,
##   <https://CRAN.R-project.org/package=epiDisplay>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {epiDisplay: Epidemiological Data Display Package},
##     author = {Virasakdi Chongsuvivatwong},
##     year = {2022},
##     note = {R package version 3.5.0.2},
##     url = {https://CRAN.R-project.org/package=epiDisplay},
##   }
## 
## ATTENTION: This citation information has been auto-generated from the
## package DESCRIPTION file and may need manual editing, see
## 'help("citation")'.
## 
## 
## 
## 
## [[435]]
## 
## To cite package 'esquisse' in publications use:
## 
##   Meyer F, Perrier V (2022). _esquisse: Explore and Visualize Your Data
##   Interactively_. R package version 1.1.2,
##   <https://CRAN.R-project.org/package=esquisse>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {esquisse: Explore and Visualize Your Data Interactively},
##     author = {Fanny Meyer and Victor Perrier},
##     year = {2022},
##     note = {R package version 1.1.2},
##     url = {https://CRAN.R-project.org/package=esquisse},
##   }
## 
## 
## 
## 
## [[436]]
## 
## To cite package 'estimability' in publications use:
## 
##   Lenth R (2022). _estimability: Tools for Assessing Estimability of
##   Linear Predictions_. R package version 1.4.1,
##   <https://CRAN.R-project.org/package=estimability>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {estimability: Tools for Assessing Estimability of Linear Predictions},
##     author = {Russell Lenth},
##     year = {2022},
##     note = {R package version 1.4.1},
##     url = {https://CRAN.R-project.org/package=estimability},
##   }
## 
## 
## 
## 
## [[437]]
## 
## To cite package 'evaluate' in publications use:
## 
##   Wickham H, Xie Y (2023). _evaluate: Parsing and Evaluation Tools that
##   Provide More Details than the Default_. R package version 0.23,
##   <https://CRAN.R-project.org/package=evaluate>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {evaluate: Parsing and Evaluation Tools that Provide More Details than the
## Default},
##     author = {Hadley Wickham and Yihui Xie},
##     year = {2023},
##     note = {R package version 0.23},
##     url = {https://CRAN.R-project.org/package=evaluate},
##   }
## 
## 
## 
## 
## [[438]]
## 
## To cite package 'expss' in publications use:
## 
##   Demin G (2022). _expss: Tables, Labels and Some Useful Functions from
##   Spreadsheets and 'SPSS' Statistics_. R package version 0.11.4,
##   <https://CRAN.R-project.org/package=expss>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {expss: Tables, Labels and Some Useful Functions from Spreadsheets and
## 'SPSS' Statistics},
##     author = {Gregory Demin},
##     year = {2022},
##     note = {R package version 0.11.4},
##     url = {https://CRAN.R-project.org/package=expss},
##   }
## 
## 
## 
## 
## [[439]]
## 
## To cite FactoMineR in publications use:
## 
##   Sebastien Le, Julie Josse, Francois Husson (2008). FactoMineR: An R
##   Package for Multivariate Analysis. Journal of Statistical Software,
##   25(1), 1-18. 10.18637/jss.v025.i01
## 
## A BibTeX entry for LaTeX users is
## 
##   @Article{,
##     title = {{FactoMineR}: A Package for Multivariate Analysis},
##     author = {S\'ebastien L\^e and Julie Josse and Fran\c{c}ois Husson},
##     journal = {Journal of Statistical Software},
##     year = {2008},
##     volume = {25},
##     number = {1},
##     pages = {1--18},
##     doi = {10.18637/jss.v025.i01},
##   }
## 
## 
## 
## 
## [[440]]
## 
## To cite package 'fansi' in publications use:
## 
##   Gaslam B (2023). _fansi: ANSI Control Sequence Aware String
##   Functions_. R package version 1.0.5,
##   <https://CRAN.R-project.org/package=fansi>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {fansi: ANSI Control Sequence Aware String Functions},
##     author = {Brodie Gaslam},
##     year = {2023},
##     note = {R package version 1.0.5},
##     url = {https://CRAN.R-project.org/package=fansi},
##   }
## 
## 
## 
## 
## [[441]]
## 
## To cite package 'farver' in publications use:
## 
##   Pedersen T, Nicolae B, François R (2022). _farver: High Performance
##   Colour Space Manipulation_. R package version 2.1.1,
##   <https://CRAN.R-project.org/package=farver>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {farver: High Performance Colour Space Manipulation},
##     author = {Thomas Lin Pedersen and Berendea Nicolae and Romain François},
##     year = {2022},
##     note = {R package version 2.1.1},
##     url = {https://CRAN.R-project.org/package=farver},
##   }
## 
## 
## 
## 
## [[442]]
## 
## To cite package 'fastDummies' in publications use:
## 
##   Kaplan J (2020). _fastDummies: Fast Creation of Dummy (Binary)
##   Columns and Rows from Categorical Variables_. R package version
##   1.6.3, <https://CRAN.R-project.org/package=fastDummies>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {fastDummies: Fast Creation of Dummy (Binary) Columns and Rows from
## Categorical Variables},
##     author = {Jacob Kaplan},
##     year = {2020},
##     note = {R package version 1.6.3},
##     url = {https://CRAN.R-project.org/package=fastDummies},
##   }
## 
## 
## 
## 
## [[443]]
## 
## To cite package 'fastICA' in publications use:
## 
##   Marchini JL, Heaton C, Ripley BD (2021). _fastICA: FastICA Algorithms
##   to Perform ICA and Projection Pursuit_. R package version 1.2-3,
##   <https://CRAN.R-project.org/package=fastICA>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {fastICA: FastICA Algorithms to Perform ICA and Projection Pursuit},
##     author = {J L Marchini and C Heaton and B D Ripley},
##     year = {2021},
##     note = {R package version 1.2-3},
##     url = {https://CRAN.R-project.org/package=fastICA},
##   }
## 
## ATTENTION: This citation information has been auto-generated from the
## package DESCRIPTION file and may need manual editing, see
## 'help("citation")'.
## 
## 
## 
## 
## [[444]]
## 
## To cite package 'fastmap' in publications use:
## 
##   Chang W (2023). _fastmap: Fast Data Structures_. R package version
##   1.1.1, <https://CRAN.R-project.org/package=fastmap>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {fastmap: Fast Data Structures},
##     author = {Winston Chang},
##     year = {2023},
##     note = {R package version 1.1.1},
##     url = {https://CRAN.R-project.org/package=fastmap},
##   }
## 
## 
## 
## 
## [[445]]
## 
## To cite package 'fdrtool' in publications use:
## 
##   Klaus B, Strimmer. K (2021). _fdrtool: Estimation of (Local) False
##   Discovery Rates and Higher Criticism_. R package version 1.2.17,
##   <https://CRAN.R-project.org/package=fdrtool>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {fdrtool: Estimation of (Local) False Discovery Rates and Higher Criticism},
##     author = {Bernd Klaus and Korbinian Strimmer.},
##     year = {2021},
##     note = {R package version 1.2.17},
##     url = {https://CRAN.R-project.org/package=fdrtool},
##   }
## 
## ATTENTION: This citation information has been auto-generated from the
## package DESCRIPTION file and may need manual editing, see
## 'help("citation")'.
## 
## 
## 
## 
## [[446]]
## 
## To cite flashClust in publications use:
## 
##   Peter Langfelder, Steve Horvath (2012). Fast R Functions for Robust
##   Correlations and Hierarchical Clustering. Journal of Statistical
##   Software, 46(11), 1-17. URL http://www.jstatsoft.org/v46/i11/.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Article{,
##     title = {Fast {R} Functions for Robust Correlations and Hierarchical Clustering},
##     author = {Peter Langfelder and Steve Horvath},
##     journal = {Journal of Statistical Software},
##     year = {2012},
##     volume = {46},
##     number = {11},
##     pages = {1--17},
##     url = {http://www.jstatsoft.org/v46/i11/},
##   }
## 
## 
## [[447]]
## 
## To cite package 'flextable' in publications use:
## 
##   Gohel D, Skintzos P (2023). _flextable: Functions for Tabular
##   Reporting_. R package version 0.8.4,
##   <https://CRAN.R-project.org/package=flextable>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {flextable: Functions for Tabular Reporting},
##     author = {David Gohel and Panagiotis Skintzos},
##     year = {2023},
##     note = {R package version 0.8.4},
##     url = {https://CRAN.R-project.org/package=flextable},
##   }
## 
## 
## 
## 
## [[448]]
## 
## To cite package 'float' in publications use:
## 
##   Schmidt D (2022). "float: 32-Bit Floats." R package version 0.3-0,
##   <https://cran.r-project.org/package=float>.
## 
##   Schmidt D (2017). _Introducing the float package: 32-Bit Floats for
##   R_. R Vignette, <https://cran.r-project.org/package=float>.
## 
## To see these entries in BibTeX format, use 'print(<citation>,
## bibtex=TRUE)', 'toBibtex(.)', or set
## 'options(citation.bibtex.max=999)'.
## 
## 
## [[449]]
## 
## To cite package 'FNN' in publications use:
## 
##   Beygelzimer A, Kakadet S, Langford J, Arya S, Mount D, Li S (2023).
##   _FNN: Fast Nearest Neighbor Search Algorithms and Applications_. R
##   package version 1.1.3.2, <https://CRAN.R-project.org/package=FNN>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {FNN: Fast Nearest Neighbor Search Algorithms and Applications},
##     author = {Alina Beygelzimer and Sham Kakadet and John Langford and Sunil Arya and David Mount and Shengqiao Li},
##     year = {2023},
##     note = {R package version 1.1.3.2},
##     url = {https://CRAN.R-project.org/package=FNN},
##   }
## 
## ATTENTION: This citation information has been auto-generated from the
## package DESCRIPTION file and may need manual editing, see
## 'help("citation")'.
## 
## 
## 
## 
## [[450]]
## 
## To cite package 'fontawesome' in publications use:
## 
##   Iannone R (2023). _fontawesome: Easily Work with 'Font Awesome'
##   Icons_. R package version 0.5.1,
##   <https://CRAN.R-project.org/package=fontawesome>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {fontawesome: Easily Work with 'Font Awesome' Icons},
##     author = {Richard Iannone},
##     year = {2023},
##     note = {R package version 0.5.1},
##     url = {https://CRAN.R-project.org/package=fontawesome},
##   }
## 
## 
## 
## 
## [[451]]
## 
## To cite package 'forcats' in publications use:
## 
##   Wickham H (2023). _forcats: Tools for Working with Categorical
##   Variables (Factors)_. R package version 1.0.0,
##   <https://CRAN.R-project.org/package=forcats>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {forcats: Tools for Working with Categorical Variables (Factors)},
##     author = {Hadley Wickham},
##     year = {2023},
##     note = {R package version 1.0.0},
##     url = {https://CRAN.R-project.org/package=forcats},
##   }
## 
## 
## 
## 
## [[452]]
## 
## To cite package 'foreach' in publications use:
## 
##   Microsoft, Weston S (2022). _foreach: Provides Foreach Looping
##   Construct_. R package version 1.5.2,
##   <https://CRAN.R-project.org/package=foreach>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {foreach: Provides Foreach Looping Construct},
##     author = {{Microsoft} and Steve Weston},
##     year = {2022},
##     note = {R package version 1.5.2},
##     url = {https://CRAN.R-project.org/package=foreach},
##   }
## 
## 
## 
## 
## [[453]]
## 
## To cite package 'foreign' in publications use:
## 
##   R Core Team (2022). _foreign: Read Data Stored by 'Minitab', 'S',
##   'SAS', 'SPSS', 'Stata', 'Systat', 'Weka', 'dBase', ..._. R package
##   version 0.8-84, <https://CRAN.R-project.org/package=foreign>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {foreign: Read Data Stored by 'Minitab', 'S', 'SAS', 'SPSS', 'Stata',
## 'Systat', 'Weka', 'dBase', ...},
##     author = {{R Core Team}},
##     year = {2022},
##     note = {R package version 0.8-84},
##     url = {https://CRAN.R-project.org/package=foreign},
##   }
## 
## 
## 
## 
## [[454]]
## 
## To cite Formula in publications use:
## 
##   Zeileis A, Croissant Y (2010). "Extended Model Formulas in R:
##   Multiple Parts and Multiple Responses." _Journal of Statistical
##   Software_, *34*(1), 1-13. doi:10.18637/jss.v034.i01
##   <https://doi.org/10.18637/jss.v034.i01>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Article{,
##     title = {Extended Model Formulas in {R}: Multiple Parts and Multiple Responses},
##     author = {Achim Zeileis and Yves Croissant},
##     journal = {Journal of Statistical Software},
##     year = {2010},
##     volume = {34},
##     number = {1},
##     pages = {1--13},
##     doi = {10.18637/jss.v034.i01},
##   }
## 
## 
## 
## 
## [[455]]
## 
## To cite package 'fs' in publications use:
## 
##   Hester J, Wickham H, Csárdi G (2023). _fs: Cross-Platform File System
##   Operations Based on 'libuv'_. R package version 1.6.3,
##   <https://CRAN.R-project.org/package=fs>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {fs: Cross-Platform File System Operations Based on 'libuv'},
##     author = {Jim Hester and Hadley Wickham and Gábor Csárdi},
##     year = {2023},
##     note = {R package version 1.6.3},
##     url = {https://CRAN.R-project.org/package=fs},
##   }
## 
## 
## 
## 
## [[456]]
## 
## To cite package 'fst' in publications use:
## 
##   Klik M (2022). _fst: Lightning Fast Serialization of Data Frames_. R
##   package version 0.9.8, <https://CRAN.R-project.org/package=fst>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {fst: Lightning Fast Serialization of Data Frames},
##     author = {Mark Klik},
##     year = {2022},
##     note = {R package version 0.9.8},
##     url = {https://CRAN.R-project.org/package=fst},
##   }
## 
## 
## 
## 
## [[457]]
## 
## To cite package 'fstcore' in publications use:
## 
##   Klik M (2023). _fstcore: R Bindings to the 'Fstlib' Library_. R
##   package version 0.9.14, <https://CRAN.R-project.org/package=fstcore>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {fstcore: R Bindings to the 'Fstlib' Library},
##     author = {Mark Klik},
##     year = {2023},
##     note = {R package version 0.9.14},
##     url = {https://CRAN.R-project.org/package=fstcore},
##   }
## 
## 
## 
## 
## [[458]]
## 
## To cite package 'ftExtra' in publications use:
## 
##   Yasumoto A (2023). _ftExtra: Extensions for 'Flextable'_. R package
##   version 0.5.0, <https://CRAN.R-project.org/package=ftExtra>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {ftExtra: Extensions for 'Flextable'},
##     author = {Atsushi Yasumoto},
##     year = {2023},
##     note = {R package version 0.5.0},
##     url = {https://CRAN.R-project.org/package=ftExtra},
##   }
## 
## 
## 
## 
## [[459]]
## 
## To cite package 'furrr' in publications use:
## 
##   Vaughan D, Dancho M (2022). _furrr: Apply Mapping Functions in
##   Parallel using Futures_. R package version 0.3.1,
##   <https://CRAN.R-project.org/package=furrr>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {furrr: Apply Mapping Functions in Parallel using Futures},
##     author = {Davis Vaughan and Matt Dancho},
##     year = {2022},
##     note = {R package version 0.3.1},
##     url = {https://CRAN.R-project.org/package=furrr},
##   }
## 
## 
## 
## 
## [[460]]
## 
## Please cite 'future' and the future framework using the following
## references:
## 
##   Henrik Bengtsson, A Unifying Framework for Parallel and Distributed
##   Processing in R using Futures, The R Journal (2021) 13:2, pages
##   208-227, doi:10.32614/RJ-2021-048
## 
## A BibTeX entry for LaTeX users is
## 
##   @Article{RJ-2021-048,
##     author = {Henrik Bengtsson},
##     title = {A Unifying Framework for Parallel and Distributed Processing in R using Futures},
##     year = {2021},
##     journal = {The R Journal},
##     doi = {10.32614/RJ-2021-048},
##     url = {https://doi.org/10.32614/RJ-2021-048},
##     pages = {208--227},
##     volume = {13},
##     number = {2},
##   }
## 
## 
## [[461]]
## 
## Please cite 'future' and the future framework using the following
## references:
## 
##   Henrik Bengtsson, A Unifying Framework for Parallel and Distributed
##   Processing in R using Futures, The R Journal (2021) 13:2, pages
##   208-227, doi:10.32614/RJ-2021-048
## 
## A BibTeX entry for LaTeX users is
## 
##   @Article{RJ-2021-048,
##     author = {Henrik Bengtsson},
##     title = {A Unifying Framework for Parallel and Distributed Processing in R using Futures},
##     year = {2021},
##     journal = {The R Journal},
##     doi = {10.32614/RJ-2021-048},
##     url = {https://doi.org/10.32614/RJ-2021-048},
##     pages = {208--227},
##     volume = {13},
##     number = {2},
##   }
## 
## 
## [[462]]
## 
## To cite package 'gam' in publications use:
## 
##   Hastie T (2022). _gam: Generalized Additive Models_. R package
##   version 1.22, <https://CRAN.R-project.org/package=gam>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {gam: Generalized Additive Models},
##     author = {Trevor Hastie},
##     year = {2022},
##     note = {R package version 1.22},
##     url = {https://CRAN.R-project.org/package=gam},
##   }
## 
## ATTENTION: This citation information has been auto-generated from the
## package DESCRIPTION file and may need manual editing, see
## 'help("citation")'.
## 
## 
## 
## 
## [[463]]
## 
## To cite GAMLSS in publications use:
## 
##   Rigby R.A. and Stasinopoulos D.M. (2005). Generalized additive models
##   for location, scale and shape,(with discussion), Appl. Statist., 54,
##   part 3, pp 507-554.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Article{,
##     title = {Generalized additive models for location, scale and shape,(with discussion)},
##     journal = {Applied Statistics},
##     volume = {54},
##     part = {3},
##     pages = {507-554},
##     year = {2005},
##     author = {R. A. Rigby and D. M. Stasinopoulos},
##   }
## 
## We have invested a lot of time and effort in creating GAMLSS, please
## cite it when using it for data analysis.
## 
## 
## [[464]]
## 
## To cite package 'gamlss.data' in publications use:
## 
##   Stasinopoulos M, Rigby B, De Bastiani F (2021). _gamlss.data: Data
##   for Generalised Additive Models for Location Scale and Shape_. R
##   package version 6.0-2,
##   <https://CRAN.R-project.org/package=gamlss.data>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {gamlss.data: Data for Generalised Additive Models for Location Scale and
## Shape},
##     author = {Mikis Stasinopoulos and Bob Rigby and Fernanda {De Bastiani}},
##     year = {2021},
##     note = {R package version 6.0-2},
##     url = {https://CRAN.R-project.org/package=gamlss.data},
##   }
## 
## ATTENTION: This citation information has been auto-generated from the
## package DESCRIPTION file and may need manual editing, see
## 'help("citation")'.
## 
## 
## 
## 
## [[465]]
## 
## To cite package 'gamlss.dist' in publications use:
## 
##   Stasinopoulos M, Rigby R (2022). _gamlss.dist: Distributions for
##   Generalized Additive Models for Location Scale and Shape_. R package
##   version 6.0-5, <https://CRAN.R-project.org/package=gamlss.dist>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {gamlss.dist: Distributions for Generalized Additive Models for Location Scale
## and Shape},
##     author = {Mikis Stasinopoulos and Robert Rigby},
##     year = {2022},
##     note = {R package version 6.0-5},
##     url = {https://CRAN.R-project.org/package=gamlss.dist},
##   }
## 
## 
## 
## 
## [[466]]
## 
## To cite package 'gargle' in publications use:
## 
##   Bryan J, Citro C, Wickham H (2022). _gargle: Utilities for Working
##   with Google APIs_. R package version 1.2.1,
##   <https://CRAN.R-project.org/package=gargle>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {gargle: Utilities for Working with Google APIs},
##     author = {Jennifer Bryan and Craig Citro and Hadley Wickham},
##     year = {2022},
##     note = {R package version 1.2.1},
##     url = {https://CRAN.R-project.org/package=gargle},
##   }
## 
## 
## 
## 
## [[467]]
## 
## To cite package 'gdtools' in publications use:
## 
##   Gohel D, Wickham H, Henry L, Ooms J (2023). _gdtools: Utilities for
##   Graphical Rendering and Fonts Management_. R package version 0.3.0,
##   <https://CRAN.R-project.org/package=gdtools>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {gdtools: Utilities for Graphical Rendering and Fonts Management},
##     author = {David Gohel and Hadley Wickham and Lionel Henry and Jeroen Ooms},
##     year = {2023},
##     note = {R package version 0.3.0},
##     url = {https://CRAN.R-project.org/package=gdtools},
##   }
## 
## 
## 
## 
## [[468]]
## 
## To cite package 'generics' in publications use:
## 
##   Wickham H, Kuhn M, Vaughan D (2022). _generics: Common S3 Generics
##   not Provided by Base R Methods Related to Model Fitting_. R package
##   version 0.1.3, <https://CRAN.R-project.org/package=generics>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {generics: Common S3 Generics not Provided by Base R Methods Related to
## Model Fitting},
##     author = {Hadley Wickham and Max Kuhn and Davis Vaughan},
##     year = {2022},
##     note = {R package version 0.1.3},
##     url = {https://CRAN.R-project.org/package=generics},
##   }
## 
## 
## 
## 
## [[469]]
## 
## To cite package 'gert' in publications use:
## 
##   Ooms J (2022). _gert: Simple Git Client for R_. R package version
##   1.9.2, <https://CRAN.R-project.org/package=gert>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {gert: Simple Git Client for R},
##     author = {Jeroen Ooms},
##     year = {2022},
##     note = {R package version 1.9.2},
##     url = {https://CRAN.R-project.org/package=gert},
##   }
## 
## 
## 
## 
## [[470]]
## 
## To cite package 'gfonts' in publications use:
## 
##   Perrier V, Meyer F (2023). _gfonts: Offline 'Google' Fonts for
##   'Markdown' and 'Shiny'_. R package version 0.2.0,
##   <https://CRAN.R-project.org/package=gfonts>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {gfonts: Offline 'Google' Fonts for 'Markdown' and 'Shiny'},
##     author = {Victor Perrier and Fanny Meyer},
##     year = {2023},
##     note = {R package version 0.2.0},
##     url = {https://CRAN.R-project.org/package=gfonts},
##   }
## 
## 
## 
## 
## [[471]]
## 
## To cite package 'ggbeeswarm' in publications use:
## 
##   Clarke E, Sherrill-Mix S, Dawson C (2022). _ggbeeswarm: Categorical
##   Scatter (Violin Point) Plots_. R package version 0.7.1,
##   <https://CRAN.R-project.org/package=ggbeeswarm>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {ggbeeswarm: Categorical Scatter (Violin Point) Plots},
##     author = {Erik Clarke and Scott Sherrill-Mix and Charlotte Dawson},
##     year = {2022},
##     note = {R package version 0.7.1},
##     url = {https://CRAN.R-project.org/package=ggbeeswarm},
##   }
## 
## 
## 
## 
## [[472]]
## 
## To cite package 'ggcorrplot' in publications use:
## 
##   Kassambara A (2022). _ggcorrplot: Visualization of a Correlation
##   Matrix using 'ggplot2'_. R package version 0.1.4,
##   <https://CRAN.R-project.org/package=ggcorrplot>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {ggcorrplot: Visualization of a Correlation Matrix using 'ggplot2'},
##     author = {Alboukadel Kassambara},
##     year = {2022},
##     note = {R package version 0.1.4},
##     url = {https://CRAN.R-project.org/package=ggcorrplot},
##   }
## 
## 
## 
## 
## [[473]]
## 
## To cite package 'ggExtra' in publications use:
## 
##   Attali D, Baker C (2022). _ggExtra: Add Marginal Histograms to
##   'ggplot2', and More 'ggplot2' Enhancements_. R package version
##   0.10.0, <https://CRAN.R-project.org/package=ggExtra>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {ggExtra: Add Marginal Histograms to 'ggplot2', and More 'ggplot2'
## Enhancements},
##     author = {Dean Attali and Christopher Baker},
##     year = {2022},
##     note = {R package version 0.10.0},
##     url = {https://CRAN.R-project.org/package=ggExtra},
##   }
## 
## 
## 
## 
## [[474]]
## 
## To cite ggfortify in publications, please use:
## 
##   Yuan Tang, Masaaki Horikoshi, and Wenxuan Li. "ggfortify: Unified
##   Interface to Visualize Statistical Result of Popular R Packages." The
##   R Journal 8.2 (2016): 478-489.
## 
##   Masaaki Horikoshi and Yuan Tang (2016). ggfortify: Data Visualization
##   Tools for Statistical Analysis Results.
##   https://CRAN.R-project.org/package=ggfortify
## 
## To see these entries in BibTeX format, use 'print(<citation>,
## bibtex=TRUE)', 'toBibtex(.)', or set
## 'options(citation.bibtex.max=999)'.
## 
## 
## [[475]]
## 
## To cite package 'ggiraph' in publications use:
## 
##   Gohel D, Skintzos P (2023). _ggiraph: Make 'ggplot2' Graphics
##   Interactive_. R package version 0.8.6,
##   <https://CRAN.R-project.org/package=ggiraph>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {ggiraph: Make 'ggplot2' Graphics Interactive},
##     author = {David Gohel and Panagiotis Skintzos},
##     year = {2023},
##     note = {R package version 0.8.6},
##     url = {https://CRAN.R-project.org/package=ggiraph},
##   }
## 
## 
## 
## 
## [[476]]
## 
## To cite ggplot2 in publications, please use
## 
##   H. Wickham. ggplot2: Elegant Graphics for Data Analysis.
##   Springer-Verlag New York, 2016.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Book{,
##     author = {Hadley Wickham},
##     title = {ggplot2: Elegant Graphics for Data Analysis},
##     publisher = {Springer-Verlag New York},
##     year = {2016},
##     isbn = {978-3-319-24277-4},
##     url = {https://ggplot2.tidyverse.org},
##   }
## 
## 
## 
## 
## [[477]]
## 
## To cite package 'ggpubr' in publications use:
## 
##   Kassambara A (2022). _ggpubr: 'ggplot2' Based Publication Ready
##   Plots_. R package version 0.5.0,
##   <https://CRAN.R-project.org/package=ggpubr>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {ggpubr: 'ggplot2' Based Publication Ready Plots},
##     author = {Alboukadel Kassambara},
##     year = {2022},
##     note = {R package version 0.5.0},
##     url = {https://CRAN.R-project.org/package=ggpubr},
##   }
## 
## 
## 
## 
## [[478]]
## 
## To cite package 'ggrepel' in publications use:
## 
##   Slowikowski K (2022). _ggrepel: Automatically Position
##   Non-Overlapping Text Labels with 'ggplot2'_. R package version 0.9.2,
##   <https://CRAN.R-project.org/package=ggrepel>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {ggrepel: Automatically Position Non-Overlapping Text Labels with
## 'ggplot2'},
##     author = {Kamil Slowikowski},
##     year = {2022},
##     note = {R package version 0.9.2},
##     url = {https://CRAN.R-project.org/package=ggrepel},
##   }
## 
## 
## 
## 
## [[479]]
## 
## To cite package 'ggsci' in publications use:
## 
##   Xiao N (2018). _ggsci: Scientific Journal and Sci-Fi Themed Color
##   Palettes for 'ggplot2'_. R package version 2.9,
##   <https://CRAN.R-project.org/package=ggsci>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {ggsci: Scientific Journal and Sci-Fi Themed Color Palettes for
## 'ggplot2'},
##     author = {Nan Xiao},
##     year = {2018},
##     note = {R package version 2.9},
##     url = {https://CRAN.R-project.org/package=ggsci},
##   }
## 
## 
## 
## 
## [[480]]
## 
## To cite 'ggsignif' in publications use:
## 
##   Ahlmann-Eltze, C., & Patil, I. (2021). ggsignif: R Package for
##   Displaying Significance Brackets for 'ggplot2'. PsyArxiv.
##   doi:10.31234/osf.io/7awm6
## 
## A BibTeX entry for LaTeX users is
## 
##   @Article{,
##     title = {{ggsignif}: R Package for Displaying Significance Brackets for {'ggplot2'}},
##     author = {Ahlmann-Eltze Constantin and Indrajeet Patil},
##     year = {2021},
##     journal = {PsyArxiv},
##     url = {https://psyarxiv.com/7awm6},
##     doi = {10.31234/osf.io/7awm6},
##   }
## 
## 
## [[481]]
## 
## To cite package 'ggthemes' in publications use:
## 
##   Arnold J (2021). _ggthemes: Extra Themes, Scales and Geoms for
##   'ggplot2'_. R package version 4.2.4,
##   <https://CRAN.R-project.org/package=ggthemes>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {ggthemes: Extra Themes, Scales and Geoms for 'ggplot2'},
##     author = {Jeffrey B. Arnold},
##     year = {2021},
##     note = {R package version 4.2.4},
##     url = {https://CRAN.R-project.org/package=ggthemes},
##   }
## 
## 
## 
## 
## [[482]]
## 
## To cite package 'gh' in publications use:
## 
##   Bryan J, Wickham H (2023). _gh: 'GitHub' 'API'_. R package version
##   1.4.0, <https://CRAN.R-project.org/package=gh>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {gh: 'GitHub' 'API'},
##     author = {Jennifer Bryan and Hadley Wickham},
##     year = {2023},
##     note = {R package version 1.4.0},
##     url = {https://CRAN.R-project.org/package=gh},
##   }
## 
## 
## 
## 
## [[483]]
## 
## To cite package 'gitcreds' in publications use:
## 
##   Csárdi G (2022). _gitcreds: Query 'git' Credentials from 'R'_. R
##   package version 0.1.2, <https://CRAN.R-project.org/package=gitcreds>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {gitcreds: Query 'git' Credentials from 'R'},
##     author = {Gábor Csárdi},
##     year = {2022},
##     note = {R package version 0.1.2},
##     url = {https://CRAN.R-project.org/package=gitcreds},
##   }
## 
## 
## 
## 
## [[484]]
## 
## To cite glmnet in publications use:
## 
##   Jerome Friedman, Trevor Hastie, Robert Tibshirani (2010).
##   Regularization Paths for Generalized Linear Models via Coordinate
##   Descent. Journal of Statistical Software, 33(1), 1-22. URL
##   https://www.jstatsoft.org/v33/i01/.
## 
## If coxnet is used, please also cite:
## 
##   Noah Simon, Jerome Friedman, Trevor Hastie, Rob Tibshirani (2011).
##   Regularization Paths for Cox's Proportional Hazards Model via
##   Coordinate Descent. Journal of Statistical Software, 39(5), 1-13. URL
##   https://www.jstatsoft.org/v39/i05/.
## 
## To see these entries in BibTeX format, use 'print(<citation>,
## bibtex=TRUE)', 'toBibtex(.)', or set
## 'options(citation.bibtex.max=999)'.
## 
## 
## [[485]]
## 
## To cite package 'globals' in publications use:
## 
##   Bengtsson H (2022). _globals: Identify Global Objects in R
##   Expressions_. R package version 0.16.2,
##   <https://CRAN.R-project.org/package=globals>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {globals: Identify Global Objects in R Expressions},
##     author = {Henrik Bengtsson},
##     year = {2022},
##     note = {R package version 0.16.2},
##     url = {https://CRAN.R-project.org/package=globals},
##   }
## 
## 
## 
## 
## [[486]]
## 
## To cite package 'glue' in publications use:
## 
##   Hester J, Bryan J (2022). _glue: Interpreted String Literals_. R
##   package version 1.6.2, <https://CRAN.R-project.org/package=glue>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {glue: Interpreted String Literals},
##     author = {Jim Hester and Jennifer Bryan},
##     year = {2022},
##     note = {R package version 1.6.2},
##     url = {https://CRAN.R-project.org/package=glue},
##   }
## 
## 
## 
## 
## [[487]]
## 
## To cite package 'googledrive' in publications use:
## 
##   D'Agostino McGowan L, Bryan J (2021). _googledrive: An Interface to
##   Google Drive_. R package version 2.0.0,
##   <https://CRAN.R-project.org/package=googledrive>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {googledrive: An Interface to Google Drive},
##     author = {Lucy {D'Agostino McGowan} and Jennifer Bryan},
##     year = {2021},
##     note = {R package version 2.0.0},
##     url = {https://CRAN.R-project.org/package=googledrive},
##   }
## 
## 
## 
## 
## [[488]]
## 
## To cite package 'googlesheets4' in publications use:
## 
##   Bryan J (2022). _googlesheets4: Access Google Sheets using the Sheets
##   API V4_. R package version 1.0.1,
##   <https://CRAN.R-project.org/package=googlesheets4>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {googlesheets4: Access Google Sheets using the Sheets API V4},
##     author = {Jennifer Bryan},
##     year = {2022},
##     note = {R package version 1.0.1},
##     url = {https://CRAN.R-project.org/package=googlesheets4},
##   }
## 
## 
## 
## 
## [[489]]
## 
## To cite the googleVis package in publications use:
## 
##   Markus Gesmann and Diego de Castillo. Using the Google Visualisation
##   API with R. The R Journal, 3(2):40-44, December 2011.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Article{,
##     title = {googleVis: Interface between R and the Google Visualisation API},
##     author = {Markus Gesmann and Diego {de Castillo}},
##     journal = {The R Journal},
##     year = {2011},
##     volume = {3},
##     number = {2},
##     pages = {40--44},
##     month = {December},
##     url = {https://journal.r-project.org/archive/2011-2/RJournal_2011-2_Gesmann+de~Castillo.pdf},
##   }
## 
## 
## [[490]]
## 
## To cite package 'gower' in publications use:
## 
##   van der Loo M (2022). _gower: Gower's Distance_. R package version
##   1.0.1, <https://CRAN.R-project.org/package=gower>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {gower: Gower's Distance},
##     author = {Mark {van der Loo}},
##     year = {2022},
##     note = {R package version 1.0.1},
##     url = {https://CRAN.R-project.org/package=gower},
##   }
## 
## 
## 
## 
## [[491]]
## 
## To cite package 'GPArotation' in publications use:
## 
##   Bernaards, Coen A. and Jennrich, Robert I. (2005) Gradient Projection
##   Algorithms and Software for ArbitraryRotation Criteria in Factor
##   Analysis, Educational and Psychological Measurement: 65, 676-696.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Article{,
##     author = {Coen A. Bernaards and Robert I.Jennrich},
##     year = {2005},
##     title = {Gradient Projection Algorithms and Software for Arbitrary
##              Rotation Criteria in Factor Analysis},
##     journal = {Educational and Psychological Measurement},
##     volume = {65},
##     pages = {676--696},
##   }
## 
## 
## [[492]]
## 
## To cite GPfit in publications use:
## 
##   Blake MacDonald, Pritam Ranjan, Hugh Chipman (2015). GPfit: An R
##   Package for Fitting a Gaussian Process Model to Deterministic
##   Simulator Outputs. Journal of Statistical Software, 64(12), 1-23. URL
##   http://www.jstatsoft.org/v64/i12/.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Article{,
##     title = {{GPfit}: An {R} Package for Fitting a Gaussian Process Model to Deterministic Simulator Outputs},
##     author = {Blake MacDonald and Pritam Ranjan and Hugh Chipman},
##     journal = {Journal of Statistical Software},
##     year = {2015},
##     volume = {64},
##     number = {12},
##     pages = {1--23},
##     url = {http://www.jstatsoft.org/v64/i12/},
##   }
## 
## 
## [[493]]
## 
## To cite package 'gplots' in publications use:
## 
##   Warnes G, Bolker B, Bonebakker L, Gentleman R, Huber W, Liaw A,
##   Lumley T, Maechler M, Magnusson A, Moeller S, Schwartz M, Venables B
##   (2022). _gplots: Various R Programming Tools for Plotting Data_. R
##   package version 3.1.3, <https://CRAN.R-project.org/package=gplots>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {gplots: Various R Programming Tools for Plotting Data},
##     author = {Gregory R. Warnes and Ben Bolker and Lodewijk Bonebakker and Robert Gentleman and Wolfgang Huber and Andy Liaw and Thomas Lumley and Martin Maechler and Arni Magnusson and Steffen Moeller and Marc Schwartz and Bill Venables},
##     year = {2022},
##     note = {R package version 3.1.3},
##     url = {https://CRAN.R-project.org/package=gplots},
##   }
## 
## 
## 
## 
## [[494]]
## 
## To cite package 'graph' in publications use:
## 
##   Gentleman R, Whalen E, Huber W, Falcon S (2022). _graph: graph: A
##   package to handle graph data structures_. R package version 1.74.0.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {graph: graph: A package to handle graph data structures},
##     author = {R. Gentleman and Elizabeth Whalen and W. Huber and S. Falcon},
##     year = {2022},
##     note = {R package version 1.74.0},
##   }
## 
## ATTENTION: This citation information has been auto-generated from the
## package DESCRIPTION file and may need manual editing, see
## 'help("citation")'.
## 
## 
## 
## 
## [[495]]
## 
## The 'graphics' package is part of R.  To cite R in publications use:
## 
##   R Core Team (2022). R: A language and environment for statistical
##   computing. R Foundation for Statistical Computing, Vienna, Austria.
##   URL https://www.R-project.org/.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {R: A Language and Environment for Statistical Computing},
##     author = {{R Core Team}},
##     organization = {R Foundation for Statistical Computing},
##     address = {Vienna, Austria},
##     year = {2022},
##     url = {https://www.R-project.org/},
##   }
## 
## We have invested a lot of time and effort in creating R, please cite it
## when using it for data analysis. See also 'citation("pkgname")' for
## citing R packages.
## 
## 
## [[496]]
## 
## The 'grDevices' package is part of R.  To cite R in publications use:
## 
##   R Core Team (2022). R: A language and environment for statistical
##   computing. R Foundation for Statistical Computing, Vienna, Austria.
##   URL https://www.R-project.org/.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {R: A Language and Environment for Statistical Computing},
##     author = {{R Core Team}},
##     organization = {R Foundation for Statistical Computing},
##     address = {Vienna, Austria},
##     year = {2022},
##     url = {https://www.R-project.org/},
##   }
## 
## We have invested a lot of time and effort in creating R, please cite it
## when using it for data analysis. See also 'citation("pkgname")' for
## citing R packages.
## 
## 
## [[497]]
## 
## The 'grid' package is part of R.  To cite R in publications use:
## 
##   R Core Team (2022). R: A language and environment for statistical
##   computing. R Foundation for Statistical Computing, Vienna, Austria.
##   URL https://www.R-project.org/.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {R: A Language and Environment for Statistical Computing},
##     author = {{R Core Team}},
##     organization = {R Foundation for Statistical Computing},
##     address = {Vienna, Austria},
##     year = {2022},
##     url = {https://www.R-project.org/},
##   }
## 
## We have invested a lot of time and effort in creating R, please cite it
## when using it for data analysis. See also 'citation("pkgname")' for
## citing R packages.
## 
## 
## [[498]]
## 
## To cite package 'gridExtra' in publications use:
## 
##   Auguie B (2017). _gridExtra: Miscellaneous Functions for "Grid"
##   Graphics_. R package version 2.3,
##   <https://CRAN.R-project.org/package=gridExtra>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {gridExtra: Miscellaneous Functions for "Grid" Graphics},
##     author = {Baptiste Auguie},
##     year = {2017},
##     note = {R package version 2.3},
##     url = {https://CRAN.R-project.org/package=gridExtra},
##   }
## 
## 
## 
## 
## [[499]]
## 
## If you use any of the L2-norm penalties (penalty='grLasso', 'grMCP', or
## 'grSCAD'), cite the Statistics and Computing article.  If you use the
## group exponential lasso (penalty='gel'), cite the Biometrics article.
## If you use the composite MCP (penalty='cMCP') or group bridge
## penalties, cite the Statistics and its Interface (2009) article; note
## that the penalty is referred to as the 'group MCP' in the original
## article, but it would be better to refer to it as 'composite MCP' in
## future works.
## 
##   Breheny P and Huang J (2015). Group descent algorithms for nonconvex
##   penalized linear and logistic regression models with grouped
##   predictors. Statistics and Computing, 25: 173-187.
## 
##   Breheny P (2015). The group exponential lasso for bi-level variable
##   selection. Biometrics, 71: 731-740.
## 
##   Breheny, P. and Huang, J. (2009) Penalized methods for bi-level
##   variable selection.  Statistics and its interface, 2: 369-380.
## 
## To see these entries in BibTeX format, use 'print(<citation>,
## bibtex=TRUE)', 'toBibtex(.)', or set
## 'options(citation.bibtex.max=999)'.
## 
## 
## [[500]]
## 
## To cite package gstat in publications use:
## 
##   Pebesma, E.J., 2004. Multivariable geostatistics in S: the gstat
##   package. Computers & Geosciences, 30: 683-691.
## 
##   Benedikt Gräler, Edzer Pebesma and Gerard Heuvelink, 2016.
##   Spatio-Temporal Interpolation using gstat.  The R Journal 8(1),
##   204-218
## 
## To see these entries in BibTeX format, use 'print(<citation>,
## bibtex=TRUE)', 'toBibtex(.)', or set
## 'options(citation.bibtex.max=999)'.
## 
## 
## [[501]]
## 
## To cite package 'gt' in publications use:
## 
##   Iannone R, Cheng J, Schloerke B, Hughes E, Seo J (2022). _gt: Easily
##   Create Presentation-Ready Display Tables_. R package version 0.8.0,
##   <https://CRAN.R-project.org/package=gt>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {gt: Easily Create Presentation-Ready Display Tables},
##     author = {Richard Iannone and Joe Cheng and Barret Schloerke and Ellis Hughes and JooYoung Seo},
##     year = {2022},
##     note = {R package version 0.8.0},
##     url = {https://CRAN.R-project.org/package=gt},
##   }
## 
## 
## 
## 
## [[502]]
## 
## To cite package 'gtable' in publications use:
## 
##   Wickham H, Pedersen T (2023). _gtable: Arrange 'Grobs' in Tables_. R
##   package version 0.3.4, <https://CRAN.R-project.org/package=gtable>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {gtable: Arrange 'Grobs' in Tables},
##     author = {Hadley Wickham and Thomas Lin Pedersen},
##     year = {2023},
##     note = {R package version 0.3.4},
##     url = {https://CRAN.R-project.org/package=gtable},
##   }
## 
## 
## 
## 
## [[503]]
## 
## To cite package 'gtExtras' in publications use:
## 
##   Mock T (2022). _gtExtras: Extending 'gt' for Beautiful HTML Tables_.
##   R package version 0.4.5,
##   <https://CRAN.R-project.org/package=gtExtras>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {gtExtras: Extending 'gt' for Beautiful HTML Tables},
##     author = {Thomas Mock},
##     year = {2022},
##     note = {R package version 0.4.5},
##     url = {https://CRAN.R-project.org/package=gtExtras},
##   }
## 
## 
## 
## 
## [[504]]
## 
## To cite package 'gtools' in publications use:
## 
##   Bolker B, Warnes G, Lumley T (2022). _gtools: Various R Programming
##   Tools_. R package version 3.9.4,
##   <https://CRAN.R-project.org/package=gtools>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {gtools: Various R Programming Tools},
##     author = {Ben Bolker and Gregory R. Warnes and Thomas Lumley},
##     year = {2022},
##     note = {R package version 3.9.4},
##     url = {https://CRAN.R-project.org/package=gtools},
##   }
## 
## 
## 
## 
## [[505]]
## 
## To cite gtsummary in publications use:
## 
##   Sjoberg DD, Whiting K, Curry M, Lavery JA, Larmarange J. Reproducible
##   summary tables with the gtsummary package. The R Journal
##   2021;13:570–80. https://doi.org/10.32614/RJ-2021-053.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Article{gtsummary,
##     author = {Daniel D. Sjoberg and Karissa Whiting and Michael Curry and Jessica A. Lavery and Joseph Larmarange},
##     title = {Reproducible Summary Tables with the gtsummary Package},
##     journal = {{The R Journal}},
##     year = {2021},
##     url = {https://doi.org/10.32614/RJ-2021-053},
##     doi = {10.32614/RJ-2021-053},
##     volume = {13},
##     issue = {1},
##     pages = {570-580},
##   }
## 
## 
## [[506]]
## 
## To cite package 'hardhat' in publications use:
## 
##   Vaughan D, Kuhn M (2022). _hardhat: Construct Modeling Packages_. R
##   package version 1.2.0, <https://CRAN.R-project.org/package=hardhat>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {hardhat: Construct Modeling Packages},
##     author = {Davis Vaughan and Max Kuhn},
##     year = {2022},
##     note = {R package version 1.2.0},
##     url = {https://CRAN.R-project.org/package=hardhat},
##   }
## 
## 
## 
## 
## [[507]]
## 
## To cite package 'haven' in publications use:
## 
##   Wickham H, Miller E, Smith D (2023). _haven: Import and Export
##   'SPSS', 'Stata' and 'SAS' Files_. R package version 2.5.3,
##   <https://CRAN.R-project.org/package=haven>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {haven: Import and Export 'SPSS', 'Stata' and 'SAS' Files},
##     author = {Hadley Wickham and Evan Miller and Danny Smith},
##     year = {2023},
##     note = {R package version 2.5.3},
##     url = {https://CRAN.R-project.org/package=haven},
##   }
## 
## 
## 
## 
## [[508]]
## 
## To cite package 'here' in publications use:
## 
##   Müller K (2020). _here: A Simpler Way to Find Your Files_. R package
##   version 1.0.1, <https://CRAN.R-project.org/package=here>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {here: A Simpler Way to Find Your Files},
##     author = {Kirill Müller},
##     year = {2020},
##     note = {R package version 1.0.1},
##     url = {https://CRAN.R-project.org/package=here},
##   }
## 
## 
## 
## 
## [[509]]
## 
## To cite package 'highr' in publications use:
## 
##   Xie Y, Qiu Y (2022). _highr: Syntax Highlighting for R Source Code_.
##   R package version 0.10, <https://CRAN.R-project.org/package=highr>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {highr: Syntax Highlighting for R Source Code},
##     author = {Yihui Xie and Yixuan Qiu},
##     year = {2022},
##     note = {R package version 0.10},
##     url = {https://CRAN.R-project.org/package=highr},
##   }
## 
## 
## 
## 
## [[510]]
## 
## To cite package 'hipread' in publications use:
## 
##   Freedman Ellis G, Derek Burk (2022). _hipread: Read Hierarchical
##   Fixed Width Files_. R package version 0.2.3,
##   <https://CRAN.R-project.org/package=hipread>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {hipread: Read Hierarchical Fixed Width Files},
##     author = {Greg {Freedman Ellis} and {Derek Burk}},
##     year = {2022},
##     note = {R package version 0.2.3},
##     url = {https://CRAN.R-project.org/package=hipread},
##   }
## 
## 
## 
## 
## [[511]]
## 
## To cite package 'HistData' in publications use:
## 
##   Friendly M (2021). _HistData: Data Sets from the History of
##   Statistics and Data Visualization_. R package version 0.8-7,
##   <https://CRAN.R-project.org/package=HistData>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {HistData: Data Sets from the History of Statistics and Data Visualization},
##     author = {Michael Friendly},
##     year = {2021},
##     note = {R package version 0.8-7},
##     url = {https://CRAN.R-project.org/package=HistData},
##   }
## 
## 
## 
## 
## [[512]]
## 
## To cite package 'Hmisc' in publications use:
## 
##   Harrell Jr F (2022). _Hmisc: Harrell Miscellaneous_. R package
##   version 4.7-2, <https://CRAN.R-project.org/package=Hmisc>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {Hmisc: Harrell Miscellaneous},
##     author = {Frank E {Harrell Jr}},
##     year = {2022},
##     note = {R package version 4.7-2},
##     url = {https://CRAN.R-project.org/package=Hmisc},
##   }
## 
## 
## 
## 
## [[513]]
## 
## To cite package 'hms' in publications use:
## 
##   Müller K (2023). _hms: Pretty Time of Day_. R package version 1.1.3,
##   <https://CRAN.R-project.org/package=hms>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {hms: Pretty Time of Day},
##     author = {Kirill Müller},
##     year = {2023},
##     note = {R package version 1.1.3},
##     url = {https://CRAN.R-project.org/package=hms},
##   }
## 
## 
## 
## 
## [[514]]
## 
## To cite package 'htmlTable' in publications use:
## 
##   Gordon M, Gragg S, Konings P (2022). _htmlTable: Advanced Tables for
##   Markdown/HTML_. R package version 2.4.1,
##   <https://CRAN.R-project.org/package=htmlTable>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {htmlTable: Advanced Tables for Markdown/HTML},
##     author = {Max Gordon and Stephen Gragg and Peter Konings},
##     year = {2022},
##     note = {R package version 2.4.1},
##     url = {https://CRAN.R-project.org/package=htmlTable},
##   }
## 
## 
## 
## 
## [[515]]
## 
## To cite package 'htmltools' in publications use:
## 
##   Cheng J, Sievert C, Schloerke B, Chang W, Xie Y, Allen J (2023).
##   _htmltools: Tools for HTML_. R package version 0.5.5,
##   <https://CRAN.R-project.org/package=htmltools>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {htmltools: Tools for HTML},
##     author = {Joe Cheng and Carson Sievert and Barret Schloerke and Winston Chang and Yihui Xie and Jeff Allen},
##     year = {2023},
##     note = {R package version 0.5.5},
##     url = {https://CRAN.R-project.org/package=htmltools},
##   }
## 
## 
## 
## 
## [[516]]
## 
## To cite package 'htmlwidgets' in publications use:
## 
##   Vaidyanathan R, Xie Y, Allaire J, Cheng J, Sievert C, Russell K
##   (2023). _htmlwidgets: HTML Widgets for R_. R package version 1.6.1,
##   <https://CRAN.R-project.org/package=htmlwidgets>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {htmlwidgets: HTML Widgets for R},
##     author = {Ramnath Vaidyanathan and Yihui Xie and JJ Allaire and Joe Cheng and Carson Sievert and Kenton Russell},
##     year = {2023},
##     note = {R package version 1.6.1},
##     url = {https://CRAN.R-project.org/package=htmlwidgets},
##   }
## 
## 
## 
## 
## [[517]]
## 
## To cite package 'httpcode' in publications use:
## 
##   Chamberlain S (2020). _httpcode: 'HTTP' Status Code Helper_. R
##   package version 0.3.0, <https://CRAN.R-project.org/package=httpcode>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {httpcode: 'HTTP' Status Code Helper},
##     author = {Scott Chamberlain},
##     year = {2020},
##     note = {R package version 0.3.0},
##     url = {https://CRAN.R-project.org/package=httpcode},
##   }
## 
## 
## 
## 
## [[518]]
## 
## To cite package 'httpuv' in publications use:
## 
##   Cheng J, Chang W, Reid S, Brown J, Trower B, Peslyak A (2023).
##   _httpuv: HTTP and WebSocket Server Library_. R package version
##   1.6.11, <https://CRAN.R-project.org/package=httpuv>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {httpuv: HTTP and WebSocket Server Library},
##     author = {Joe Cheng and Winston Chang and Steve Reid and James Brown and Bob Trower and Alexander Peslyak},
##     year = {2023},
##     note = {R package version 1.6.11},
##     url = {https://CRAN.R-project.org/package=httpuv},
##   }
## 
## 
## 
## 
## [[519]]
## 
## To cite package 'httr' in publications use:
## 
##   Wickham H (2023). _httr: Tools for Working with URLs and HTTP_. R
##   package version 1.4.7, <https://CRAN.R-project.org/package=httr>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {httr: Tools for Working with URLs and HTTP},
##     author = {Hadley Wickham},
##     year = {2023},
##     note = {R package version 1.4.7},
##     url = {https://CRAN.R-project.org/package=httr},
##   }
## 
## 
## 
## 
## [[520]]
## 
## To cite package 'huxtable' in publications use:
## 
##   Hugh-Jones D (2022). _huxtable: Easily Create and Style Tables for
##   LaTeX, HTML and Other Formats_. R package version 5.5.2,
##   <https://CRAN.R-project.org/package=huxtable>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {huxtable: Easily Create and Style Tables for LaTeX, HTML and Other Formats},
##     author = {David Hugh-Jones},
##     year = {2022},
##     note = {R package version 5.5.2},
##     url = {https://CRAN.R-project.org/package=huxtable},
##   }
## 
## 
## 
## 
## [[521]]
## 
## To cite package 'ids' in publications use:
## 
##   FitzJohn R (2017). _ids: Generate Random Identifiers_. R package
##   version 1.0.1, <https://CRAN.R-project.org/package=ids>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {ids: Generate Random Identifiers},
##     author = {Rich FitzJohn},
##     year = {2017},
##     note = {R package version 1.0.1},
##     url = {https://CRAN.R-project.org/package=ids},
##   }
## 
## 
## 
## 
## [[522]]
## 
## To cite 'igraph' in publications use:
## 
##   Csardi G, Nepusz T (2006). "The igraph software package for complex
##   network research." _InterJournal_, *Complex Systems*, 1695.
##   <https://igraph.org>.
## 
## Csárdi G, Nepusz T, Traag V, Horvát Sz, Zanini F, Noom D, Müller K
## (2023). _igraph: Network Analysis and Visualization in R_.
## doi:10.5281/zenodo.7682609 <https://doi.org/10.5281/zenodo.7682609>, R
## package version 1.5.1, <https://CRAN.R-project.org/package=igraph>.
## 
## To see these entries in BibTeX format, use 'print(<citation>,
## bibtex=TRUE)', 'toBibtex(.)', or set
## 'options(citation.bibtex.max=999)'.
## 
## 
## [[523]]
## 
## To cite package 'infer' in publications use:
## 
##   Couch et al., (2021). infer: An R package for tidyverse-friendly
##   statistical inference. Journal of Open Source Software, 6(65), 3661,
##   https://doi.org/10.21105/joss.03661
## 
## A BibTeX entry for LaTeX users is
## 
##   @Article{,
##     title = {{infer}: An {R} package for tidyverse-friendly statistical inference},
##     author = {Simon P. Couch and Andrew P. Bray and Chester Ismay and Evgeni Chasnovski and Benjamin S. Baumer and Mine Çetinkaya-Rundel},
##     journal = {Journal of Open Source Software},
##     year = {2021},
##     volume = {6},
##     number = {65},
##     pages = {3661},
##     doi = {10.21105/joss.03661},
##   }
## 
## 
## [[524]]
## 
## To cite package 'influenceR' in publications use:
## 
##   Simon J, Aditya K (2021). _influenceR: Software Tools to Quantify
##   Structural Importance of Nodes in a Network_. R package version
##   0.1.0.1, <https://CRAN.R-project.org/package=influenceR>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {influenceR: Software Tools to Quantify Structural Importance of Nodes in a
## Network},
##     author = {Jacobs Simon and Khanna Aditya},
##     year = {2021},
##     note = {R package version 0.1.0.1},
##     url = {https://CRAN.R-project.org/package=influenceR},
##   }
## 
## 
## 
## 
## [[525]]
## 
## To cite package 'ini' in publications use:
## 
##   Dias DV (2018). _ini: Read and Write '.ini' Files_. R package version
##   0.3.1, <https://CRAN.R-project.org/package=ini>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {ini: Read and Write '.ini' Files},
##     author = {David Valentim Dias},
##     year = {2018},
##     note = {R package version 0.3.1},
##     url = {https://CRAN.R-project.org/package=ini},
##   }
## 
## ATTENTION: This citation information has been auto-generated from the
## package DESCRIPTION file and may need manual editing, see
## 'help("citation")'.
## 
## 
## 
## 
## [[526]]
## 
## To cite package 'insight' in publications use:
## 
##   Lüdecke D, Waggoner P, Makowski D (2019). "insight: A Unified
##   Interface to Access Information from Model Objects in R." _Journal of
##   Open Source Software_, *4*(38), 1412. doi:10.21105/joss.01412
##   <https://doi.org/10.21105/joss.01412>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Article{,
##     title = {{insight}: A Unified Interface to Access Information from Model Objects in {R}.},
##     volume = {4},
##     doi = {10.21105/joss.01412},
##     number = {38},
##     journal = {Journal of Open Source Software},
##     author = {Daniel Lüdecke and Philip Waggoner and Dominique Makowski},
##     year = {2019},
##     pages = {1412},
##   }
## 
## 
## [[527]]
## 
## To cite package 'installr' in publications use:
## 
##   Galili T (2022). _installr: Using R to Install Stuff on Windows OS
##   (Such As: R, 'Rtools', 'RStudio', 'Git', and More!)_. R package
##   version 0.23.4, <https://CRAN.R-project.org/package=installr>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {installr: Using R to Install Stuff on Windows OS (Such As: R, 'Rtools',
## 'RStudio', 'Git', and More!)},
##     author = {Tal Galili},
##     year = {2022},
##     note = {R package version 0.23.4},
##     url = {https://CRAN.R-project.org/package=installr},
##   }
## 
## 
## 
## 
## [[528]]
## 
## To cite package 'interp' in publications use:
## 
##   Gebhardt A, Bivand R, Sinclair D (2022). _interp: Interpolation
##   Methods_. R package version 1.1-3,
##   <https://CRAN.R-project.org/package=interp>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {interp: Interpolation Methods},
##     author = {Albrecht Gebhardt and Roger Bivand and David Sinclair},
##     year = {2022},
##     note = {R package version 1.1-3},
##     url = {https://CRAN.R-project.org/package=interp},
##   }
## 
## 
## 
## 
## [[529]]
## 
## To cite package 'intervals' in publications use:
## 
##   Bourgon R (2023). _intervals: Tools for Working with Points and
##   Intervals_. R package version 0.15.3,
##   <https://CRAN.R-project.org/package=intervals>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {intervals: Tools for Working with Points and Intervals},
##     author = {Richard Bourgon},
##     year = {2023},
##     note = {R package version 0.15.3},
##     url = {https://CRAN.R-project.org/package=intervals},
##   }
## 
## ATTENTION: This citation information has been auto-generated from the
## package DESCRIPTION file and may need manual editing, see
## 'help("citation")'.
## 
## 
## 
## 
## [[530]]
## 
## To cite package 'ipred' in publications use:
## 
##   Peters A, Hothorn T (2022). _ipred: Improved Predictors_. R package
##   version 0.9-13, <https://CRAN.R-project.org/package=ipred>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {ipred: Improved Predictors},
##     author = {Andrea Peters and Torsten Hothorn},
##     year = {2022},
##     note = {R package version 0.9-13},
##     url = {https://CRAN.R-project.org/package=ipred},
##   }
## 
## 
## 
## 
## [[531]]
## 
## To cite package 'IPSUR' in publications use:
## 
##   Kerns GJ (2011). _IPSUR: Introduction to Probability and Statistics
##   Using R_. R package version 2.0/r205,
##   <https://R-Forge.R-project.org/projects/ipsur/>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {IPSUR: Introduction to Probability and Statistics Using R},
##     author = {G. Jay Kerns},
##     year = {2011},
##     note = {R package version 2.0/r205},
##     url = {https://R-Forge.R-project.org/projects/ipsur/},
##   }
## 
## ATTENTION: This citation information has been auto-generated from the
## package DESCRIPTION file and may need manual editing, see
## 'help("citation")'.
## 
## 
## 
## 
## [[532]]
## 
## To cite package 'ipumsr' in publications use:
## 
##   Greg Freedman Ellis, Derek Burk (2022). _ipumsr: Read 'IPUMS' Extract
##   Files_. R package version 0.5.2,
##   <https://CRAN.R-project.org/package=ipumsr>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {ipumsr: Read 'IPUMS' Extract Files},
##     author = {{Greg Freedman Ellis} and {Derek Burk}},
##     year = {2022},
##     note = {R package version 0.5.2},
##     url = {https://CRAN.R-project.org/package=ipumsr},
##   }
## 
## 
## 
## 
## [[533]]
## 
## To cite package 'ISLR' in publications use:
## 
##   James G, Witten D, Hastie T, Tibshirani R (2021). _ISLR: Data for an
##   Introduction to Statistical Learning with Applications in R_. R
##   package version 1.4, <https://CRAN.R-project.org/package=ISLR>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {ISLR: Data for an Introduction to Statistical Learning with
## Applications in R},
##     author = {Gareth James and Daniela Witten and Trevor Hastie and Rob Tibshirani},
##     year = {2021},
##     note = {R package version 1.4},
##     url = {https://CRAN.R-project.org/package=ISLR},
##   }
## 
## ATTENTION: This citation information has been auto-generated from the
## package DESCRIPTION file and may need manual editing, see
## 'help("citation")'.
## 
## 
## 
## 
## [[534]]
## 
## To cite package 'isoband' in publications use:
## 
##   Wickham H, Wilke C, Pedersen T (2022). _isoband: Generate Isolines
##   and Isobands from Regularly Spaced Elevation Grids_. R package
##   version 0.2.7, <https://CRAN.R-project.org/package=isoband>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {isoband: Generate Isolines and Isobands from Regularly Spaced Elevation
## Grids},
##     author = {Hadley Wickham and Claus O. Wilke and Thomas Lin Pedersen},
##     year = {2022},
##     note = {R package version 0.2.7},
##     url = {https://CRAN.R-project.org/package=isoband},
##   }
## 
## 
## 
## 
## [[535]]
## 
## To cite package 'ISwR' in publications use:
## 
##   Dalgaard P (2020). _ISwR: Introductory Statistics with R_. R package
##   version 2.0-8, <https://CRAN.R-project.org/package=ISwR>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {ISwR: Introductory Statistics with R},
##     author = {Peter Dalgaard},
##     year = {2020},
##     note = {R package version 2.0-8},
##     url = {https://CRAN.R-project.org/package=ISwR},
##   }
## 
## ATTENTION: This citation information has been auto-generated from the
## package DESCRIPTION file and may need manual editing, see
## 'help("citation")'.
## 
## 
## 
## 
## [[536]]
## 
## To cite package 'iterators' in publications use:
## 
##   Analytics R, Weston S (2022). _iterators: Provides Iterator
##   Construct_. R package version 1.0.14,
##   <https://CRAN.R-project.org/package=iterators>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {iterators: Provides Iterator Construct},
##     author = {Revolution Analytics and Steve Weston},
##     year = {2022},
##     note = {R package version 1.0.14},
##     url = {https://CRAN.R-project.org/package=iterators},
##   }
## 
## 
## 
## 
## [[537]]
## 
## To cite package 'janitor' in publications use:
## 
##   Firke S (2021). _janitor: Simple Tools for Examining and Cleaning
##   Dirty Data_. R package version 2.1.0,
##   <https://CRAN.R-project.org/package=janitor>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {janitor: Simple Tools for Examining and Cleaning Dirty Data},
##     author = {Sam Firke},
##     year = {2021},
##     note = {R package version 2.1.0},
##     url = {https://CRAN.R-project.org/package=janitor},
##   }
## 
## 
## 
## 
## [[538]]
## 
## To cite package 'jpeg' in publications use:
## 
##   Urbanek S (2022). _jpeg: Read and write JPEG images_. R package
##   version 0.1-10, <https://CRAN.R-project.org/package=jpeg>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {jpeg: Read and write JPEG images},
##     author = {Simon Urbanek},
##     year = {2022},
##     note = {R package version 0.1-10},
##     url = {https://CRAN.R-project.org/package=jpeg},
##   }
## 
## ATTENTION: This citation information has been auto-generated from the
## package DESCRIPTION file and may need manual editing, see
## 'help("citation")'.
## 
## 
## 
## 
## [[539]]
## 
## To cite package 'jquerylib' in publications use:
## 
##   Sievert C, Cheng J (2021). _jquerylib: Obtain 'jQuery' as an HTML
##   Dependency Object_. R package version 0.1.4,
##   <https://CRAN.R-project.org/package=jquerylib>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {jquerylib: Obtain 'jQuery' as an HTML Dependency Object},
##     author = {Carson Sievert and Joe Cheng},
##     year = {2021},
##     note = {R package version 0.1.4},
##     url = {https://CRAN.R-project.org/package=jquerylib},
##   }
## 
## 
## 
## 
## [[540]]
## 
## To cite jsonlite in publications use:
## 
##   Ooms J (2014). "The jsonlite Package: A Practical and Consistent
##   Mapping Between JSON Data and R Objects." _arXiv:1403.2805
##   [stat.CO]_. <https://arxiv.org/abs/1403.2805>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Article{,
##     title = {The jsonlite Package: A Practical and Consistent Mapping Between JSON Data and R Objects},
##     author = {Jeroen Ooms},
##     journal = {arXiv:1403.2805 [stat.CO]},
##     year = {2014},
##     url = {https://arxiv.org/abs/1403.2805},
##   }
## 
## 
## [[541]]
## 
## To cite package 'juicyjuice' in publications use:
## 
##   Iannone R (2022). _juicyjuice: Inline CSS Properties into HTML Tags
##   Using 'juice'_. R package version 0.1.0,
##   <https://CRAN.R-project.org/package=juicyjuice>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {juicyjuice: Inline CSS Properties into HTML Tags Using 'juice'},
##     author = {Richard Iannone},
##     year = {2022},
##     note = {R package version 0.1.0},
##     url = {https://CRAN.R-project.org/package=juicyjuice},
##   }
## 
## 
## 
## 
## [[542]]
## 
## To cite package 'kableExtra' in publications use:
## 
##   Zhu H (2023). _kableExtra: Construct Complex Table with 'kable' and
##   Pipe Syntax_. http://haozhu233.github.io/kableExtra/,
##   https://github.com/haozhu233/kableExtra.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {kableExtra: Construct Complex Table with 'kable' and Pipe Syntax},
##     author = {Hao Zhu},
##     year = {2023},
##     note = {http://haozhu233.github.io/kableExtra/,
## https://github.com/haozhu233/kableExtra},
##   }
## 
## 
## 
## 
## [[543]]
## 
## To cite package 'kernlab' in publications use:
## 
##   Karatzoglou A, Smola A, Hornik K (2022). _kernlab: Kernel-Based
##   Machine Learning Lab_. R package version 0.9-31,
##   <https://CRAN.R-project.org/package=kernlab>.
## 
##   Karatzoglou A, Smola A, Hornik K, Zeileis A (2004). "kernlab - An S4
##   Package for Kernel Methods in R." _Journal of Statistical Software_,
##   *11*(9), 1-20. doi:10.18637/jss.v011.i09
##   <https://doi.org/10.18637/jss.v011.i09>.
## 
## To see these entries in BibTeX format, use 'print(<citation>,
## bibtex=TRUE)', 'toBibtex(.)', or set
## 'options(citation.bibtex.max=999)'.
## 
## 
## [[544]]
## 
## To cite package 'KernSmooth' in publications use:
## 
##   Wand M (2021). _KernSmooth: Functions for Kernel Smoothing Supporting
##   Wand & Jones (1995)_. R package version 2.23-20,
##   <https://CRAN.R-project.org/package=KernSmooth>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {KernSmooth: Functions for Kernel Smoothing Supporting Wand & Jones (1995)},
##     author = {Matt Wand},
##     year = {2021},
##     note = {R package version 2.23-20},
##     url = {https://CRAN.R-project.org/package=KernSmooth},
##   }
## 
## 
## 
## 
## [[545]]
## 
## To cite klaR in publications use:
## 
##   Weihs, C., Ligges, U., Luebke, K. and Raabe, N. (2005). klaR
##   Analyzing German Business Cycles. In Baier, D., Decker, R. and
##   Schmidt-Thieme, L. (eds.). Data Analysis and Decision Support,
##   335-343, Springer-Verlag, Berlin.
## 
## A BibTeX entry for LaTeX users is
## 
##   @InProceedings{,
##     title = {klaR Analyzing German Business Cycles},
##     author = {Claus Weihs and Uwe Ligges and Karsten Luebke and Nils Raabe},
##     booktitle = {Data Analysis and Decision Support},
##     editor = {D. Baier and R. Decker and L. Schmidt-Thieme},
##     publisher = {Springer-Verlag},
##     address = {Berlin},
##     year = {2005},
##     pages = {335-343},
##   }
## 
## 
## [[546]]
## 
## To cite the 'knitr' package in publications use:
## 
##   Yihui Xie (2023). knitr: A General-Purpose Package for Dynamic Report
##   Generation in R. R package version 1.42.
## 
##   Yihui Xie (2015) Dynamic Documents with R and knitr. 2nd edition.
##   Chapman and Hall/CRC. ISBN 978-1498716963
## 
##   Yihui Xie (2014) knitr: A Comprehensive Tool for Reproducible
##   Research in R. In Victoria Stodden, Friedrich Leisch and Roger D.
##   Peng, editors, Implementing Reproducible Computational Research.
##   Chapman and Hall/CRC. ISBN 978-1466561595
## 
## To see these entries in BibTeX format, use 'print(<citation>,
## bibtex=TRUE)', 'toBibtex(.)', or set
## 'options(citation.bibtex.max=999)'.
## 
## 
## [[547]]
## 
## To cite package 'labeling' in publications use:
## 
##   Talbot, J (2023). _labeling: Axis Labeling_. R package version 0.4.3,
##   <https://CRAN.R-project.org/package=labeling>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {labeling: Axis Labeling},
##     author = {Justin Talbot,},
##     year = {2023},
##     note = {R package version 0.4.3},
##     url = {https://CRAN.R-project.org/package=labeling},
##   }
## 
## ATTENTION: This citation information has been auto-generated from the
## package DESCRIPTION file and may need manual editing, see
## 'help("citation")'.
## 
## 
## 
## 
## [[548]]
## 
## To cite package 'labelled' in publications use:
## 
##   Larmarange J (2023). _labelled: Manipulating Labelled Data_. R
##   package version 2.12.0,
##   <https://CRAN.R-project.org/package=labelled>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {labelled: Manipulating Labelled Data},
##     author = {Joseph Larmarange},
##     year = {2023},
##     note = {R package version 2.12.0},
##     url = {https://CRAN.R-project.org/package=labelled},
##   }
## 
## 
## 
## 
## [[549]]
## 
## To cite package 'later' in publications use:
## 
##   Chang W, Cheng J (2023). _later: Utilities for Scheduling Functions
##   to Execute Later with Event Loops_. R package version 1.3.1,
##   <https://CRAN.R-project.org/package=later>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {later: Utilities for Scheduling Functions to Execute Later with Event
## Loops},
##     author = {Winston Chang and Joe Cheng},
##     year = {2023},
##     note = {R package version 1.3.1},
##     url = {https://CRAN.R-project.org/package=later},
##   }
## 
## 
## 
## 
## [[550]]
## 
## To cite the lattice package in publications use:
## 
##   Sarkar, Deepayan (2008) Lattice: Multivariate Data Visualization with
##   R. Springer, New York. ISBN 978-0-387-75968-5
## 
## A BibTeX entry for LaTeX users is
## 
##   @Book{,
##     title = {Lattice: Multivariate Data Visualization with R},
##     author = {Deepayan Sarkar},
##     publisher = {Springer},
##     address = {New York},
##     year = {2008},
##     note = {ISBN 978-0-387-75968-5},
##     url = {http://lmdvr.r-forge.r-project.org},
##   }
## 
## 
## [[551]]
## 
## To cite package 'latticeExtra' in publications use:
## 
##   Sarkar D, Andrews F (2022). _latticeExtra: Extra Graphical Utilities
##   Based on Lattice_. R package version 0.6-30,
##   <https://CRAN.R-project.org/package=latticeExtra>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {latticeExtra: Extra Graphical Utilities Based on Lattice},
##     author = {Deepayan Sarkar and Felix Andrews},
##     year = {2022},
##     note = {R package version 0.6-30},
##     url = {https://CRAN.R-project.org/package=latticeExtra},
##   }
## 
## ATTENTION: This citation information has been auto-generated from the
## package DESCRIPTION file and may need manual editing, see
## 'help("citation")'.
## 
## 
## 
## 
## [[552]]
## 
## To cite 'lava' in publications use:
## 
##   Klaus K. Holst and Esben Budtz-Joergensen (2013). Linear Latent
##   Variable Models: The lava-package. Computational Statistics, 28 (4),
##   pp. 1385-1452. doi: 10.1007/s00180-012-0344-y.
## 
##   Klaus K. Holst and Esben Budtz-Joergensen (2020). A two-stage
##   estimation procedure for non-linear structural equation models.
##   Biostatistics, 21 (4), pp. 676-691. doi:
##   10.1093/biostatistics/kxy082.
## 
## To see these entries in BibTeX format, use 'print(<citation>,
## bibtex=TRUE)', 'toBibtex(.)', or set
## 'options(citation.bibtex.max=999)'.
## 
## 
## [[553]]
## 
## To cite lavaan in publications use:
## 
##   Yves Rosseel (2012). lavaan: An R Package for Structural Equation
##   Modeling. Journal of Statistical Software, 48(2), 1-36.
##   https://doi.org/10.18637/jss.v048.i02
## 
## A BibTeX entry for LaTeX users is
## 
##   @Article{,
##     title = {{lavaan}: An {R} Package for Structural Equation Modeling},
##     author = {Yves Rosseel},
##     journal = {Journal of Statistical Software},
##     year = {2012},
##     volume = {48},
##     number = {2},
##     pages = {1--36},
##     doi = {10.18637/jss.v048.i02},
##   }
## 
## 
## [[554]]
## 
## To cite package 'lazyeval' in publications use:
## 
##   Wickham H (2019). _lazyeval: Lazy (Non-Standard) Evaluation_. R
##   package version 0.2.2, <https://CRAN.R-project.org/package=lazyeval>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {lazyeval: Lazy (Non-Standard) Evaluation},
##     author = {Hadley Wickham},
##     year = {2019},
##     note = {R package version 0.2.2},
##     url = {https://CRAN.R-project.org/package=lazyeval},
##   }
## 
## 
## 
## 
## [[555]]
## 
## To cite package 'leaps' in publications use:
## 
##   Miller TLboFcbA (2020). _leaps: Regression Subset Selection_. R
##   package version 3.1, <https://CRAN.R-project.org/package=leaps>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {leaps: Regression Subset Selection},
##     author = {Thomas Lumley based on Fortran code by Alan Miller},
##     year = {2020},
##     note = {R package version 3.1},
##     url = {https://CRAN.R-project.org/package=leaps},
##   }
## 
## ATTENTION: This citation information has been auto-generated from the
## package DESCRIPTION file and may need manual editing, see
## 'help("citation")'.
## 
## 
## 
## 
## [[556]]
## 
## To cite package 'lemon' in publications use:
## 
##   Edwards S (2022). _lemon: Freshing Up your 'ggplot2' Plots_. R
##   package version 0.4.6, <https://CRAN.R-project.org/package=lemon>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {lemon: Freshing Up your 'ggplot2' Plots},
##     author = {Stefan McKinnon Edwards},
##     year = {2022},
##     note = {R package version 0.4.6},
##     url = {https://CRAN.R-project.org/package=lemon},
##   }
## 
## 
## 
## 
## [[557]]
## 
## To cite package 'lhs' in publications use:
## 
##   Carnell R (2022). _lhs: Latin Hypercube Samples_. R package version
##   1.1.6, <https://CRAN.R-project.org/package=lhs>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {lhs: Latin Hypercube Samples},
##     author = {Rob Carnell},
##     year = {2022},
##     note = {R package version 1.1.6},
##     url = {https://CRAN.R-project.org/package=lhs},
##   }
## 
## 
## 
## 
## [[558]]
## 
## To cite package 'libcoin' in publications use:
## 
##   Hothorn T (2021). _libcoin: Linear Test Statistics for Permutation
##   Inference_. R package version 1.0-9,
##   <https://CRAN.R-project.org/package=libcoin>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {libcoin: Linear Test Statistics for Permutation Inference},
##     author = {Torsten Hothorn},
##     year = {2021},
##     note = {R package version 1.0-9},
##     url = {https://CRAN.R-project.org/package=libcoin},
##   }
## 
## 
## 
## 
## [[559]]
## 
## To cite package 'lifecycle' in publications use:
## 
##   Henry L, Wickham H (2023). _lifecycle: Manage the Life Cycle of your
##   Package Functions_. R package version 1.0.4,
##   <https://CRAN.R-project.org/package=lifecycle>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {lifecycle: Manage the Life Cycle of your Package Functions},
##     author = {Lionel Henry and Hadley Wickham},
##     year = {2023},
##     note = {R package version 1.0.4},
##     url = {https://CRAN.R-project.org/package=lifecycle},
##   }
## 
## 
## 
## 
## [[560]]
## 
## To cite package 'lintr' in publications use:
## 
##   Hester J, Angly F, Hyde R, Chirico M, Ren K, Rosenstock A, Patil I
##   (2022). _lintr: A 'Linter' for R Code_. R package version 3.0.2,
##   <https://CRAN.R-project.org/package=lintr>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {lintr: A 'Linter' for R Code},
##     author = {Jim Hester and Florent Angly and Russ Hyde and Michael Chirico and Kun Ren and Alexander Rosenstock and Indrajeet Patil},
##     year = {2022},
##     note = {R package version 3.0.2},
##     url = {https://CRAN.R-project.org/package=lintr},
##   }
## 
## 
## 
## 
## [[561]]
## 
## To cite package 'listenv' in publications use:
## 
##   Bengtsson H (2022). _listenv: Environments Behaving (Almost) as
##   Lists_. R package version 0.9.0,
##   <https://CRAN.R-project.org/package=listenv>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {listenv: Environments Behaving (Almost) as Lists},
##     author = {Henrik Bengtsson},
##     year = {2022},
##     note = {R package version 0.9.0},
##     url = {https://CRAN.R-project.org/package=listenv},
##   }
## 
## 
## 
## 
## [[562]]
## 
## To cite lme4 in publications use:
## 
##   Douglas Bates, Martin Maechler, Ben Bolker, Steve Walker (2015).
##   Fitting Linear Mixed-Effects Models Using lme4. Journal of
##   Statistical Software, 67(1), 1-48. doi:10.18637/jss.v067.i01.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Article{,
##     title = {Fitting Linear Mixed-Effects Models Using {lme4}},
##     author = {Douglas Bates and Martin M{\"a}chler and Ben Bolker and Steve Walker},
##     journal = {Journal of Statistical Software},
##     year = {2015},
##     volume = {67},
##     number = {1},
##     pages = {1--48},
##     doi = {10.18637/jss.v067.i01},
##   }
## 
## 
## 
## 
## [[563]]
## 
## To cite lmtest in publications use:
## 
##   Achim Zeileis, Torsten Hothorn (2002). Diagnostic Checking in
##   Regression Relationships. R News 2(3), 7-10. URL
##   https://CRAN.R-project.org/doc/Rnews/
## 
## A BibTeX entry for LaTeX users is
## 
##   @Article{,
##     title = {Diagnostic Checking in Regression Relationships},
##     author = {Achim Zeileis and Torsten Hothorn},
##     journal = {R News},
##     year = {2002},
##     volume = {2},
##     number = {3},
##     pages = {7--10},
##     url = {https://CRAN.R-project.org/doc/Rnews/},
##   }
## 
## 
## [[564]]
## 
## To cite package 'locpol' in publications use:
## 
##   Ojeda Cabrera J (2022). _locpol: Kernel Local Polynomial Regression_.
##   R package version 0.8.0, <https://CRAN.R-project.org/package=locpol>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {locpol: Kernel Local Polynomial Regression},
##     author = {Jorge Luis {Ojeda Cabrera}},
##     year = {2022},
##     note = {R package version 0.8.0},
##     url = {https://CRAN.R-project.org/package=locpol},
##   }
## 
## 
## 
## 
## [[565]]
## 
## To cite package 'logr' in publications use:
## 
##   Bosak D (2022). _logr: Creates Log Files_. R package version 1.3.3,
##   <https://CRAN.R-project.org/package=logr>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {logr: Creates Log Files},
##     author = {David Bosak},
##     year = {2022},
##     note = {R package version 1.3.3},
##     url = {https://CRAN.R-project.org/package=logr},
##   }
## 
## 
## 
## 
## [[566]]
## 
## To cite lubridate in publications use:
## 
##   Garrett Grolemund, Hadley Wickham (2011). Dates and Times Made Easy
##   with lubridate. Journal of Statistical Software, 40(3), 1-25. URL
##   https://www.jstatsoft.org/v40/i03/.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Article{,
##     title = {Dates and Times Made Easy with {lubridate}},
##     author = {Garrett Grolemund and Hadley Wickham},
##     journal = {Journal of Statistical Software},
##     year = {2011},
##     volume = {40},
##     number = {3},
##     pages = {1--25},
##     url = {https://www.jstatsoft.org/v40/i03/},
##   }
## 
## 
## [[567]]
## 
## To cite package 'lwgeom' in publications use:
## 
##   Pebesma E (2023). _lwgeom: Bindings to Selected 'liblwgeom' Functions
##   for Simple Features_. R package version 0.2-11,
##   <https://CRAN.R-project.org/package=lwgeom>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {lwgeom: Bindings to Selected 'liblwgeom' Functions for Simple Features},
##     author = {Edzer Pebesma},
##     year = {2023},
##     note = {R package version 0.2-11},
##     url = {https://CRAN.R-project.org/package=lwgeom},
##   }
## 
## 
## 
## 
## [[568]]
## 
## To cite package 'maditr' in publications use:
## 
##   Demin G (2022). _maditr: Fast Data Aggregation, Modification, and
##   Filtering with Pipes and 'data.table'_. R package version 0.8.3,
##   <https://CRAN.R-project.org/package=maditr>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {maditr: Fast Data Aggregation, Modification, and Filtering with Pipes
## and 'data.table'},
##     author = {Gregory Demin},
##     year = {2022},
##     note = {R package version 0.8.3},
##     url = {https://CRAN.R-project.org/package=maditr},
##   }
## 
## 
## 
## 
## [[569]]
## 
## To cite package 'magrittr' in publications use:
## 
##   Bache S, Wickham H (2022). _magrittr: A Forward-Pipe Operator for R_.
##   R package version 2.0.3,
##   <https://CRAN.R-project.org/package=magrittr>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {magrittr: A Forward-Pipe Operator for R},
##     author = {Stefan Milton Bache and Hadley Wickham},
##     year = {2022},
##     note = {R package version 2.0.3},
##     url = {https://CRAN.R-project.org/package=magrittr},
##   }
## 
## 
## 
## 
## [[570]]
## 
## To cite package 'maptools' in publications use:
## 
##   Bivand R, Lewin-Koh N (2022). _maptools: Tools for Handling Spatial
##   Objects_. R package version 1.1-6,
##   <https://CRAN.R-project.org/package=maptools>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {maptools: Tools for Handling Spatial Objects},
##     author = {Roger Bivand and Nicholas Lewin-Koh},
##     year = {2022},
##     note = {R package version 1.1-6},
##     url = {https://CRAN.R-project.org/package=maptools},
##   }
## 
## 
## 
## 
## [[571]]
## 
## To cite package 'markdown' in publications use:
## 
##   Allaire J, Horner J, Xie Y (2022). _markdown: Render Markdown with
##   'commonmark'_. R package version 1.4,
##   <https://CRAN.R-project.org/package=markdown>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {markdown: Render Markdown with 'commonmark'},
##     author = {JJ Allaire and Jeffrey Horner and Yihui Xie},
##     year = {2022},
##     note = {R package version 1.4},
##     url = {https://CRAN.R-project.org/package=markdown},
##   }
## 
## 
## 
## 
## [[572]]
## 
## To cite the MASS package in publications use:
## 
##   Venables, W. N. & Ripley, B. D. (2002) Modern Applied Statistics with
##   S. Fourth Edition. Springer, New York. ISBN 0-387-95457-0
## 
## A BibTeX entry for LaTeX users is
## 
##   @Book{,
##     title = {Modern Applied Statistics with S},
##     author = {W. N. Venables and B. D. Ripley},
##     publisher = {Springer},
##     edition = {Fourth},
##     address = {New York},
##     year = {2002},
##     note = {ISBN 0-387-95457-0},
##     url = {https://www.stats.ox.ac.uk/pub/MASS4/},
##   }
## 
## 
## [[573]]
## 
## To cite package 'Matrix' in publications use:
## 
##   Bates D, Maechler M, Jagan M (2022). _Matrix: Sparse and Dense Matrix
##   Classes and Methods_. R package version 1.5-3,
##   <https://CRAN.R-project.org/package=Matrix>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {Matrix: Sparse and Dense Matrix Classes and Methods},
##     author = {Douglas Bates and Martin Maechler and Mikael Jagan},
##     year = {2022},
##     note = {R package version 1.5-3},
##     url = {https://CRAN.R-project.org/package=Matrix},
##   }
## 
## 
## 
## 
## [[574]]
## 
## To cite package 'MatrixModels' in publications use:
## 
##   Bates D, Maechler M (2022). _MatrixModels: Modelling with Sparse and
##   Dense Matrices_. R package version 0.5-1,
##   <https://CRAN.R-project.org/package=MatrixModels>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {MatrixModels: Modelling with Sparse and Dense Matrices},
##     author = {Douglas Bates and Martin Maechler},
##     year = {2022},
##     note = {R package version 0.5-1},
##     url = {https://CRAN.R-project.org/package=MatrixModels},
##   }
## 
## ATTENTION: This citation information has been auto-generated from the
## package DESCRIPTION file and may need manual editing, see
## 'help("citation")'.
## 
## 
## 
## 
## [[575]]
## 
## To cite package 'matrixStats' in publications use:
## 
##   Bengtsson H (2022). _matrixStats: Functions that Apply to Rows and
##   Columns of Matrices (and to Vectors)_. R package version 0.63.0,
##   <https://CRAN.R-project.org/package=matrixStats>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {matrixStats: Functions that Apply to Rows and Columns of Matrices (and to
## Vectors)},
##     author = {Henrik Bengtsson},
##     year = {2022},
##     note = {R package version 0.63.0},
##     url = {https://CRAN.R-project.org/package=matrixStats},
##   }
## 
## 
## 
## 
## [[576]]
## 
## To cite package 'maxLik' in publications use:
## 
##   Arne Henningsen and Ott Toomet (2011). maxLik: A package for maximum
##   likelihood estimation in R. Computational Statistics 26(3), 443-458.
##   DOI 10.1007/s00180-010-0217-1.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Article{,
##     title = {maxLik: A package for maximum likelihood estimation in {R}},
##     author = {Arne Henningsen and Ott Toomet},
##     journal = {Computational Statistics},
##     year = {2011},
##     volume = {26},
##     number = {3},
##     pages = {443-458},
##     doi = {10.1007/s00180-010-0217-1},
##     url = {http://dx.doi.org/10.1007/s00180-010-0217-1},
##   }
## 
## 
## [[577]]
## 
## To cite package 'MBA' in publications use:
## 
##   Finley A, Banerjee S, Hjelle Ø (2022). _MBA: Multilevel B-Spline
##   Approximation_. R package version 0.1-0,
##   <https://CRAN.R-project.org/package=MBA>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {MBA: Multilevel B-Spline Approximation},
##     author = {Andrew Finley and Sudipto Banerjee and Øyvind Hjelle},
##     year = {2022},
##     note = {R package version 0.1-0},
##     url = {https://CRAN.R-project.org/package=MBA},
##   }
## 
## 
## 
## 
## [[578]]
## 
## To cite package 'mcmc' in publications use:
## 
##   Geyer CJ, Johnson LT (2020). _mcmc: Markov Chain Monte Carlo_. R
##   package version 0.9-7, <https://CRAN.R-project.org/package=mcmc>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {mcmc: Markov Chain Monte Carlo},
##     author = {Charles J. Geyer and Leif T. Johnson},
##     year = {2020},
##     note = {R package version 0.9-7},
##     url = {https://CRAN.R-project.org/package=mcmc},
##   }
## 
## ATTENTION: This citation information has been auto-generated from the
## package DESCRIPTION file and may need manual editing, see
## 'help("citation")'.
## 
## 
## 
## 
## [[579]]
## 
## To cite MCMCpack in publications use:
## 
##   Andrew D. Martin, Kevin M. Quinn, Jong Hee Park (2011). MCMCpack:
##   Markov Chain Monte Carlo in R. Journal of Statistical Software.
##   42(9): 1-21. DOI 10.18637/jss.v042.i09.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Article{,
##     title = {{MCMCpack}: Markov Chain Monte Carlo in {R}},
##     author = {Andrew D. Martin and Kevin M. Quinn and Jong Hee Park},
##     journal = {Journal of Statistical Software},
##     year = {2011},
##     volume = {42},
##     number = {9},
##     pages = {22},
##     doi = {10.18637/jss.v042.i09},
##   }
## 
## 
## [[580]]
## 
## To cite package 'mda' in publications use:
## 
##   Leisch SobTH&RTORpbF, Hornik K, code. BDRBNhcttuot (2022). _mda:
##   Mixture and Flexible Discriminant Analysis_. R package version 0.5-3,
##   <https://CRAN.R-project.org/package=mda>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {mda: Mixture and Flexible Discriminant Analysis},
##     author = {S original by Trevor Hastie & Robert Tibshirani. Original R port by Friedrich Leisch and Kurt Hornik and Brian D. Ripley. Balasubramanian Narasimhan has contributed to the upgrading of the code.},
##     year = {2022},
##     note = {R package version 0.5-3},
##     url = {https://CRAN.R-project.org/package=mda},
##   }
## 
## ATTENTION: This citation information has been auto-generated from the
## package DESCRIPTION file and may need manual editing, see
## 'help("citation")'.
## 
## 
## 
## 
## [[581]]
## 
## To cite package 'memoise' in publications use:
## 
##   Wickham H, Hester J, Chang W, Müller K, Cook D (2021). _memoise:
##   'Memoisation' of Functions_. R package version 2.0.1,
##   <https://CRAN.R-project.org/package=memoise>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {memoise: 'Memoisation' of Functions},
##     author = {Hadley Wickham and Jim Hester and Winston Chang and Kirill Müller and Daniel Cook},
##     year = {2021},
##     note = {R package version 2.0.1},
##     url = {https://CRAN.R-project.org/package=memoise},
##   }
## 
## 
## 
## 
## [[582]]
## 
## To cite the memuse package or memuse vignette:
## 
##   Schmidt D (2023). "memuse: Memory Estimation Utilities." R package
##   version 4.2-3, <https://cran.r-project.org/package=memuse>.
## 
##   Schmidt D (2023). _Guide to the memuse Package_. R package vignette,
##   <https://cran.r-project.org/package=memuse>.
## 
## To see these entries in BibTeX format, use 'print(<citation>,
## bibtex=TRUE)', 'toBibtex(.)', or set
## 'options(citation.bibtex.max=999)'.
## 
## 
## [[583]]
## 
## The 'methods' package is part of R.  To cite R in publications use:
## 
##   R Core Team (2022). R: A language and environment for statistical
##   computing. R Foundation for Statistical Computing, Vienna, Austria.
##   URL https://www.R-project.org/.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {R: A Language and Environment for Statistical Computing},
##     author = {{R Core Team}},
##     organization = {R Foundation for Statistical Computing},
##     address = {Vienna, Austria},
##     year = {2022},
##     url = {https://www.R-project.org/},
##   }
## 
## We have invested a lot of time and effort in creating R, please cite it
## when using it for data analysis. See also 'citation("pkgname")' for
## citing R packages.
## 
## 
## [[584]]
## 
## 2011 for generalized additive model method; 2016 for beyond exponential
## family; 2004 for strictly additive GCV based model method and basics of
## gamm; 2017 for overview; 2003 for thin plate regression splines.
## 
##   Wood, S.N. (2011) Fast stable restricted maximum likelihood and
##   marginal likelihood estimation of semiparametric generalized linear
##   models. Journal of the Royal Statistical Society (B) 73(1):3-36
## 
##   Wood S.N., N. Pya and B. Saefken (2016) Smoothing parameter and model
##   selection for general smooth models (with discussion). Journal of the
##   American Statistical Association 111:1548-1575.
## 
##   Wood, S.N. (2004) Stable and efficient multiple smoothing parameter
##   estimation for generalized additive models. Journal of the American
##   Statistical Association. 99:673-686.
## 
##   Wood, S.N. (2017) Generalized Additive Models: An Introduction with R
##   (2nd edition). Chapman and Hall/CRC.
## 
##   Wood, S.N. (2003) Thin-plate regression splines. Journal of the Royal
##   Statistical Society (B) 65(1):95-114.
## 
## To see these entries in BibTeX format, use 'print(<citation>,
## bibtex=TRUE)', 'toBibtex(.)', or set
## 'options(citation.bibtex.max=999)'.
## 
## 
## [[585]]
## 
## To cite mice in publications use:
## 
##   Stef van Buuren, Karin Groothuis-Oudshoorn (2011). mice: Multivariate
##   Imputation by Chained Equations in R. Journal of Statistical
##   Software, 45(3), 1-67. DOI 10.18637/jss.v045.i03.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Article{,
##     title = {{mice}: Multivariate Imputation by Chained Equations in R},
##     author = {Stef {van Buuren} and Karin Groothuis-Oudshoorn},
##     journal = {Journal of Statistical Software},
##     year = {2011},
##     volume = {45},
##     number = {3},
##     pages = {1-67},
##     doi = {10.18637/jss.v045.i03},
##   }
## 
## 
## [[586]]
## 
## To cite package 'mime' in publications use:
## 
##   Xie Y (2021). _mime: Map Filenames to MIME Types_. R package version
##   0.12, <https://CRAN.R-project.org/package=mime>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {mime: Map Filenames to MIME Types},
##     author = {Yihui Xie},
##     year = {2021},
##     note = {R package version 0.12},
##     url = {https://CRAN.R-project.org/package=mime},
##   }
## 
## 
## 
## 
## [[587]]
## 
## To cite package 'miniUI' in publications use:
## 
##   Cheng J (2018). _miniUI: Shiny UI Widgets for Small Screens_. R
##   package version 0.1.1.1, <https://CRAN.R-project.org/package=miniUI>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {miniUI: Shiny UI Widgets for Small Screens},
##     author = {Joe Cheng},
##     year = {2018},
##     note = {R package version 0.1.1.1},
##     url = {https://CRAN.R-project.org/package=miniUI},
##   }
## 
## 
## 
## 
## [[588]]
## 
## To cite package 'minqa' in publications use:
## 
##   Bates D, Mullen KM, Nash JC, Varadhan R (2023). _minqa:
##   Derivative-Free Optimization Algorithms by Quadratic Approximation_.
##   R package version 1.2.6, <https://CRAN.R-project.org/package=minqa>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {minqa: Derivative-Free Optimization Algorithms by Quadratic
## Approximation},
##     author = {Douglas Bates and Katharine M. Mullen and John C. Nash and Ravi Varadhan},
##     year = {2023},
##     note = {R package version 1.2.6},
##     url = {https://CRAN.R-project.org/package=minqa},
##   }
## 
## ATTENTION: This citation information has been auto-generated from the
## package DESCRIPTION file and may need manual editing, see
## 'help("citation")'.
## 
## 
## 
## 
## [[589]]
## 
## To cite package 'miscTools' in publications use:
## 
##   Henningsen A, Toomet O (2019). _miscTools: Miscellaneous Tools and
##   Utilities_. R package version 0.6-26,
##   <https://CRAN.R-project.org/package=miscTools>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {miscTools: Miscellaneous Tools and Utilities},
##     author = {Arne Henningsen and Ott Toomet},
##     year = {2019},
##     note = {R package version 0.6-26},
##     url = {https://CRAN.R-project.org/package=miscTools},
##   }
## 
## ATTENTION: This citation information has been auto-generated from the
## package DESCRIPTION file and may need manual editing, see
## 'help("citation")'.
## 
## 
## 
## 
## [[590]]
## 
## To cite package mlbench in publications use:
## 
##   Friedrich Leisch & Evgenia Dimitriadou (2021). mlbench: Machine
##   Learning Benchmark Problems. R package version 2.1-3.
## 
## To cite data sets from the UCI repository (as indicated in the help
## pages) use:
## 
##   Newman, D.J. & Hettich, S. & Blake, C.L. & Merz, C.J. (1998). UCI
##   Repository of machine learning databases
##   [http://www.ics.uci.edu/~mlearn/MLRepository.html]. Irvine, CA:
##   University of California, Department of Information and Computer
##   Science.
## 
## To see these entries in BibTeX format, use 'print(<citation>,
## bibtex=TRUE)', 'toBibtex(.)', or set
## 'options(citation.bibtex.max=999)'.
## 
## 
## [[591]]
## 
## To cite package 'MLmetrics' in publications use:
## 
##   Yan Y (2016). _MLmetrics: Machine Learning Evaluation Metrics_. R
##   package version 1.1.1,
##   <https://CRAN.R-project.org/package=MLmetrics>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {MLmetrics: Machine Learning Evaluation Metrics},
##     author = {Yachen Yan},
##     year = {2016},
##     note = {R package version 1.1.1},
##     url = {https://CRAN.R-project.org/package=MLmetrics},
##   }
## 
## 
## 
## 
## [[592]]
## 
## To cite the 'mnormt' package in publications use:
## 
##   Azzalini, A. and Genz, A. (2022). The R package 'mnormt': The
##   multivariate normal and 't' distributions (version 2.1.1). URL
##   http://azzalini.stat.unipd.it/SW/Pkg-mnormt/
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {The {R} package \texttt{mnormt}: The multivariate normal and $t$ distributions (version 2.1.1)},
##     author = {Adelchi Azzalini and Alan Genz},
##     year = {2022},
##     url = {http://azzalini.stat.unipd.it/SW/Pkg-mnormt/},
##   }
## 
## 
## [[593]]
## 
## To cite package 'modeldata' in publications use:
## 
##   Kuhn M (2023). _modeldata: Data Sets Useful for Modeling Examples_. R
##   package version 1.1.0,
##   <https://CRAN.R-project.org/package=modeldata>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {modeldata: Data Sets Useful for Modeling Examples},
##     author = {Max Kuhn},
##     year = {2023},
##     note = {R package version 1.1.0},
##     url = {https://CRAN.R-project.org/package=modeldata},
##   }
## 
## 
## 
## 
## [[594]]
## 
## To cite package 'modelenv' in publications use:
## 
##   Hvitfeldt E (2022). _modelenv: Provide Tools to Register Models for
##   Use in 'tidymodels'_. R package version 0.1.0,
##   <https://CRAN.R-project.org/package=modelenv>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {modelenv: Provide Tools to Register Models for Use in 'tidymodels'},
##     author = {Emil Hvitfeldt},
##     year = {2022},
##     note = {R package version 0.1.0},
##     url = {https://CRAN.R-project.org/package=modelenv},
##   }
## 
## 
## 
## 
## [[595]]
## 
## To cite package 'ModelMetrics' in publications use:
## 
##   Hunt T (2020). _ModelMetrics: Rapid Calculation of Model Metrics_. R
##   package version 1.2.2.2,
##   <https://CRAN.R-project.org/package=ModelMetrics>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {ModelMetrics: Rapid Calculation of Model Metrics},
##     author = {Tyler Hunt},
##     year = {2020},
##     note = {R package version 1.2.2.2},
##     url = {https://CRAN.R-project.org/package=ModelMetrics},
##   }
## 
## 
## 
## 
## [[596]]
## 
## To cite package 'modelr' in publications use:
## 
##   Wickham H (2022). _modelr: Modelling Functions that Work with the
##   Pipe_. R package version 0.1.10,
##   <https://CRAN.R-project.org/package=modelr>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {modelr: Modelling Functions that Work with the Pipe},
##     author = {Hadley Wickham},
##     year = {2022},
##     note = {R package version 0.1.10},
##     url = {https://CRAN.R-project.org/package=modelr},
##   }
## 
## 
## 
## 
## [[597]]
## 
## To cite modelsummary in publications use:
## 
##   Arel-Bundock V (2022). "modelsummary: Data and Model Summaries in R."
##   _Journal of Statistical Software_, *103*(1), 1-23.
##   doi:10.18637/jss.v103.i01 <https://doi.org/10.18637/jss.v103.i01>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Article{,
##     title = {{modelsummary}: Data and Model Summaries in {R}},
##     author = {Vincent Arel-Bundock},
##     journal = {Journal of Statistical Software},
##     year = {2022},
##     volume = {103},
##     number = {1},
##     pages = {1--23},
##     doi = {10.18637/jss.v103.i01},
##   }
## 
## 
## 
## 
## [[598]]
## 
## To cite package 'modeltools' in publications use:
## 
##   Hothorn T, Leisch F, Zeileis A (2020). _modeltools: Tools and Classes
##   for Statistical Models_. R package version 0.2-23,
##   <https://CRAN.R-project.org/package=modeltools>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {modeltools: Tools and Classes for Statistical Models},
##     author = {Torsten Hothorn and Friedrich Leisch and Achim Zeileis},
##     year = {2020},
##     note = {R package version 0.2-23},
##     url = {https://CRAN.R-project.org/package=modeltools},
##   }
## 
## ATTENTION: This citation information has been auto-generated from the
## package DESCRIPTION file and may need manual editing, see
## 'help("citation")'.
## 
## 
## 
## 
## [[599]]
## 
## To cite package 'moments' in publications use:
## 
##   Komsta L, Novomestky F (2022). _moments: Moments, Cumulants,
##   Skewness, Kurtosis and Related Tests_. R package version 0.14.1,
##   <https://CRAN.R-project.org/package=moments>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {moments: Moments, Cumulants, Skewness, Kurtosis and Related Tests},
##     author = {Lukasz Komsta and Frederick Novomestky},
##     year = {2022},
##     note = {R package version 0.14.1},
##     url = {https://CRAN.R-project.org/package=moments},
##   }
## 
## ATTENTION: This citation information has been auto-generated from the
## package DESCRIPTION file and may need manual editing, see
## 'help("citation")'.
## 
## 
## 
## 
## [[600]]
## 
## Please cite the multcomp package by the following reference:
## 
##   Torsten Hothorn, Frank Bretz and Peter Westfall (2008). Simultaneous
##   Inference in General Parametric Models. Biometrical Journal 50(3),
##   346--363.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Article{,
##     title = {Simultaneous Inference in General Parametric Models},
##     author = {Torsten Hothorn and Frank Bretz and Peter Westfall},
##     journal = {Biometrical Journal},
##     year = {2008},
##     volume = {50},
##     number = {3},
##     pages = {346--363},
##   }
## 
## 
## 
## 
## [[601]]
## 
## To cite package 'multcompView' in publications use:
## 
##   Graves S, Piepho H, Dorai-Raj LSwhfS (2019). _multcompView:
##   Visualizations of Paired Comparisons_. R package version 0.1-8,
##   <https://CRAN.R-project.org/package=multcompView>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {multcompView: Visualizations of Paired Comparisons},
##     author = {Spencer Graves and Hans-Peter Piepho and Luciano Selzer with help from Sundar Dorai-Raj},
##     year = {2019},
##     note = {R package version 0.1-8},
##     url = {https://CRAN.R-project.org/package=multcompView},
##   }
## 
## ATTENTION: This citation information has been auto-generated from the
## package DESCRIPTION file and may need manual editing, see
## 'help("citation")'.
## 
## 
## 
## 
## [[602]]
## 
## To cite package 'munsell' in publications use:
## 
##   Wickham C (2018). _munsell: Utilities for Using Munsell Colours_. R
##   package version 0.5.0, <https://CRAN.R-project.org/package=munsell>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {munsell: Utilities for Using Munsell Colours},
##     author = {Charlotte Wickham},
##     year = {2018},
##     note = {R package version 0.5.0},
##     url = {https://CRAN.R-project.org/package=munsell},
##   }
## 
## ATTENTION: This citation information has been auto-generated from the
## package DESCRIPTION file and may need manual editing, see
## 'help("citation")'.
## 
## 
## 
## 
## [[603]]
## 
## To cite package mvtnorm in publications use
## 
##   Alan Genz, Frank Bretz, Tetsuhisa Miwa, Xuefei Mi, Friedrich Leisch,
##   Fabian Scheipl, Torsten Hothorn (2021). mvtnorm: Multivariate Normal
##   and t Distributions. R package version 1.1-3. URL
##   http://CRAN.R-project.org/package=mvtnorm
## 
##   Alan Genz, Frank Bretz (2009), Computation of Multivariate Normal and
##   t Probabilities. Lecture Notes in Statistics, Vol. 195.,
##   Springer-Verlag, Heidelberg. ISBN 978-3-642-01688-2
## 
## To see these entries in BibTeX format, use 'print(<citation>,
## bibtex=TRUE)', 'toBibtex(.)', or set
## 'options(citation.bibtex.max=999)'.
## 
## 
## [[604]]
## 
## To cite naniar in publications use:
## 
##   Tierney N, Cook D (2023). "Expanding Tidy Data Principles to
##   Facilitate Missing Data Exploration, Visualization and Assessment of
##   Imputations." _Journal of Statistical Software_, *105*(7), 1-31.
##   doi:10.18637/jss.v105.i07 <https://doi.org/10.18637/jss.v105.i07>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Article{,
##     title = {Expanding Tidy Data Principles to Facilitate Missing Data Exploration, Visualization and Assessment of Imputations},
##     author = {Nicholas Tierney and Dianne Cook},
##     journal = {Journal of Statistical Software},
##     year = {2023},
##     volume = {105},
##     number = {7},
##     pages = {1--31},
##     doi = {10.18637/jss.v105.i07},
##   }
## 
## 
## 
## 
## [[605]]
## 
## To cite package 'nlme' in publications use:
## 
##   Pinheiro J, Bates D, R Core Team (2022). _nlme: Linear and Nonlinear
##   Mixed Effects Models_. R package version 3.1-161,
##   <https://CRAN.R-project.org/package=nlme>.
## 
##   Pinheiro JC, Bates DM (2000). _Mixed-Effects Models in S and S-PLUS_.
##   Springer, New York. doi:10.1007/b98882
##   <https://doi.org/10.1007/b98882>.
## 
## To see these entries in BibTeX format, use 'print(<citation>,
## bibtex=TRUE)', 'toBibtex(.)', or set
## 'options(citation.bibtex.max=999)'.
## 
## 
## [[606]]
## 
## If you use NLopt in work that leads to a publication, we would
## appreciate it if you would kindly cite NLopt in your manuscript. Please
## cite both the NLopt library and the authors of the specific
## algorithm(s) that you employed in your work. Cite NLopt as:
## 
##   Steven G. Johnson, The NLopt nonlinear-optimization package,
##   https://nlopt.readthedocs.io/en/latest/
## 
## A BibTeX entry for LaTeX users is
## 
##   @Article{,
##     title = {The NLopt nonlinear-optimization package},
##     author = {Steven G. Johnson},
##     year = {?},
##     journal = {?},
##     volume = {?},
##     number = {?},
##     pages = {?},
##   }
## 
## The authors and appropriate citations for the specific optimization
## algorithms in NLopt are listed in the NLopt Algorithms page.
## 
## 
## [[607]]
## 
## To cite the nnet package in publications use:
## 
##   Venables, W. N. & Ripley, B. D. (2002) Modern Applied Statistics with
##   S. Fourth Edition. Springer, New York. ISBN 0-387-95457-0
## 
## A BibTeX entry for LaTeX users is
## 
##   @Book{,
##     title = {Modern Applied Statistics with S},
##     author = {W. N. Venables and B. D. Ripley},
##     publisher = {Springer},
##     edition = {Fourth},
##     address = {New York},
##     year = {2002},
##     note = {ISBN 0-387-95457-0},
##     url = {https://www.stats.ox.ac.uk/pub/MASS4/},
##   }
## 
## 
## [[608]]
## 
## To cite package 'norm' in publications use:
## 
##   <jls@stat.psu.edu>. PtRbAANObJLS (2022). _norm: Analysis of
##   Multivariate Normal Datasets with Missing Values_. R package version
##   1.0-10.0, <https://CRAN.R-project.org/package=norm>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {norm: Analysis of Multivariate Normal Datasets with Missing Values},
##     author = {Ported to R by Alvaro A. Novo. Original by Joseph L. Schafer <jls@stat.psu.edu>.},
##     year = {2022},
##     note = {R package version 1.0-10.0},
##     url = {https://CRAN.R-project.org/package=norm},
##   }
## 
## ATTENTION: This citation information has been auto-generated from the
## package DESCRIPTION file and may need manual editing, see
## 'help("citation")'.
## 
## 
## 
## 
## [[609]]
## 
## To cite np in publications use:
## 
##   Tristen Hayfield and Jeffrey S. Racine (2008). Nonparametric
##   Econometrics: The np Package. Journal of Statistical Software 27(5).
##   DOI 10.18637/jss.v027.i05
## 
## A BibTeX entry for LaTeX users is
## 
##   @Article{,
##     title = {Nonparametric Econometrics: The np Package},
##     author = {Tristen Hayfield and Jeffrey S. Racine},
##     journal = {Journal of Statistical Software},
##     year = {2008},
##     volume = {27},
##     number = {5},
##     url = {https://www.jstatsoft.org/index.php/jss/article/view/v027i05},
##     doi = {10.18637/jss.v027.i05},
##     pages = {1-32},
##   }
## 
## 
## [[610]]
## 
## To cite package 'numDeriv' in publications use:
## 
##   Gilbert P, Varadhan R (2019). _numDeriv: Accurate Numerical
##   Derivatives_. R package version 2016.8-1.1,
##   <https://CRAN.R-project.org/package=numDeriv>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {numDeriv: Accurate Numerical Derivatives},
##     author = {Paul Gilbert and Ravi Varadhan},
##     year = {2019},
##     note = {R package version 2016.8-1.1},
##     url = {https://CRAN.R-project.org/package=numDeriv},
##   }
## 
## ATTENTION: This citation information has been auto-generated from the
## package DESCRIPTION file and may need manual editing, see
## 'help("citation")'.
## 
## 
## 
## 
## [[611]]
## 
## To cite package 'OECD' in publications use:
## 
##   Persson E (2021). _OECD: Search and Extract Data from the OECD_. R
##   package version 0.2.5, <https://CRAN.R-project.org/package=OECD>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {OECD: Search and Extract Data from the OECD},
##     author = {Eric Persson},
##     year = {2021},
##     note = {R package version 0.2.5},
##     url = {https://CRAN.R-project.org/package=OECD},
##   }
## 
## 
## 
## 
## [[612]]
## 
## To cite package 'officer' in publications use:
## 
##   Gohel D (2023). _officer: Manipulation of Microsoft Word and
##   PowerPoint Documents_. R package version 0.5.1,
##   <https://CRAN.R-project.org/package=officer>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {officer: Manipulation of Microsoft Word and PowerPoint Documents},
##     author = {David Gohel},
##     year = {2023},
##     note = {R package version 0.5.1},
##     url = {https://CRAN.R-project.org/package=officer},
##   }
## 
## 
## 
## 
## [[613]]
## 
## To cite opdisDownsampling in publications use:
## 
##   Jorn Lotsch, Sebastian Malkusch, and Alfred Ultsch (2021). Optimal
##   distribution-preserving downsampling of large biomedical data sets
##   (opdisDownsampling). PLoS One 2021 Aug 5;16(8):e0255838.
##   https://journals.plos.org/plosone/article?id=10.1371/journal.pone.0255838.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Article{,
##     title = {Optimal distribution-preserving downsampling of large biomedical data sets (opdisDownsampling)},
##     author = {Jorn Lotsch and Sebastian Malkusch and Alfred Ultsch},
##     journal = {PLoS One},
##     year = {2021},
##     volume = {16},
##     number = {9},
##     pages = {e0255838},
##     url = {https://journals.plos.org/plosone/article?id=10.1371/journal.pone.0255838},
##     doi = {10.1371/journal.pone.0255838},
##   }
## 
## 
## [[614]]
## 
## To cite package 'openai' in publications use:
## 
##   Rudnytskyi I (2023). _openai: R Wrapper for OpenAI API_. R package
##   version 0.4.1, <https://CRAN.R-project.org/package=openai>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {openai: R Wrapper for OpenAI API},
##     author = {Iegor Rudnytskyi},
##     year = {2023},
##     note = {R package version 0.4.1},
##     url = {https://CRAN.R-project.org/package=openai},
##   }
## 
## 
## 
## 
## [[615]]
## 
## To cite package 'openssl' in publications use:
## 
##   Ooms J (2023). _openssl: Toolkit for Encryption, Signatures and
##   Certificates Based on OpenSSL_. R package version 2.0.6,
##   <https://CRAN.R-project.org/package=openssl>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {openssl: Toolkit for Encryption, Signatures and Certificates Based on
## OpenSSL},
##     author = {Jeroen Ooms},
##     year = {2023},
##     note = {R package version 2.0.6},
##     url = {https://CRAN.R-project.org/package=openssl},
##   }
## 
## 
## 
## 
## [[616]]
## 
## To cite package 'openxlsx' in publications use:
## 
##   Schauberger P, Walker A (2022). _openxlsx: Read, Write and Edit xlsx
##   Files_. R package version 4.2.5.1,
##   <https://CRAN.R-project.org/package=openxlsx>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {openxlsx: Read, Write and Edit xlsx Files},
##     author = {Philipp Schauberger and Alexander Walker},
##     year = {2022},
##     note = {R package version 4.2.5.1},
##     url = {https://CRAN.R-project.org/package=openxlsx},
##   }
## 
## 
## 
## 
## [[617]]
## 
## To cite package 'packrat' in publications use:
## 
##   Ushey K, McPherson J, Cheng J, Atkins A, Allaire J, Allen T (2023).
##   _packrat: A Dependency Management System for Projects and their R
##   Package Dependencies_. R package version 0.9.0,
##   <https://CRAN.R-project.org/package=packrat>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {packrat: A Dependency Management System for Projects and their R Package
## Dependencies},
##     author = {Kevin Ushey and Jonathan McPherson and Joe Cheng and Aron Atkins and JJ Allaire and Toph Allen},
##     year = {2023},
##     note = {R package version 0.9.0},
##     url = {https://CRAN.R-project.org/package=packrat},
##   }
## 
## ATTENTION: This citation information has been auto-generated from the
## package DESCRIPTION file and may need manual editing, see
## 'help("citation")'.
## 
## 
## 
## 
## [[618]]
## 
## To cite pacman in publications, please use:
## 
##   Rinker, T. W. & Kurkiewicz, D. (2017). pacman: Package Management for
##   R. version 0.5.0. Buffalo, New York. http://github.com/trinker/pacman
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {{pacman}: {P}ackage Management for {R}},
##     author = {Tyler W. Rinker and Dason Kurkiewicz},
##     address = {Buffalo, New York},
##     note = {version 0.5.0},
##     year = {2018},
##     url = {http://github.com/trinker/pacman},
##   }
## 
## 
## [[619]]
## 
## To cite paletteer in publications use:
## 
##   Hvitfeldt E. (2021). paletteer: Comprehensive Collection of Color
##   Palettes. version 1.3.0. https://github.com/EmilHvitfeldt/paletteer
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {paletteer: Comprehensive Collection of Color Palettes},
##     author = {Emil Hvitfeldt},
##     year = {2021},
##     note = {R package version 1.3.0},
##     url = {https://github.com/EmilHvitfeldt/paletteer},
##   }
## 
## 
## [[620]]
## 
## To cite palmerpenguins in publications use:
## 
##   Horst AM, Hill AP, Gorman KB (2020). palmerpenguins: Palmer
##   Archipelago (Antarctica) penguin data. R package version 0.1.0.
##   https://allisonhorst.github.io/palmerpenguins/. doi:
##   10.5281/zenodo.3960218.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {palmerpenguins: Palmer Archipelago (Antarctica) penguin data},
##     author = {Allison Marie Horst and Alison Presmanes Hill and Kristen B Gorman},
##     year = {2020},
##     note = {R package version 0.1.0},
##     doi = {10.5281/zenodo.3960218},
##     url = {https://allisonhorst.github.io/palmerpenguins/},
##   }
## 
## 
## [[621]]
## 
## To cite package 'pamr' in publications use:
## 
##   Hastie T, Tibshirani R, Narasimhan B, Chu G (2019). _pamr: Pam:
##   Prediction Analysis for Microarrays_. R package version 1.56.1,
##   <https://CRAN.R-project.org/package=pamr>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {pamr: Pam: Prediction Analysis for Microarrays},
##     author = {T. Hastie and R. Tibshirani and Balasubramanian Narasimhan and Gil Chu},
##     year = {2019},
##     note = {R package version 1.56.1},
##     url = {https://CRAN.R-project.org/package=pamr},
##   }
## 
## ATTENTION: This citation information has been auto-generated from the
## package DESCRIPTION file and may need manual editing, see
## 'help("citation")'.
## 
## 
## 
## 
## [[622]]
## 
## The 'parallel' package is part of R.  To cite R in publications use:
## 
##   R Core Team (2022). R: A language and environment for statistical
##   computing. R Foundation for Statistical Computing, Vienna, Austria.
##   URL https://www.R-project.org/.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {R: A Language and Environment for Statistical Computing},
##     author = {{R Core Team}},
##     organization = {R Foundation for Statistical Computing},
##     address = {Vienna, Austria},
##     year = {2022},
##     url = {https://www.R-project.org/},
##   }
## 
## We have invested a lot of time and effort in creating R, please cite it
## when using it for data analysis. See also 'citation("pkgname")' for
## citing R packages.
## 
## 
## [[623]]
## 
## To cite package 'parallelly' in publications use:
## 
##   Bengtsson H (2023). _parallelly: Enhancing the 'parallel' Package_. R
##   package version 1.34.0,
##   <https://CRAN.R-project.org/package=parallelly>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {parallelly: Enhancing the 'parallel' Package},
##     author = {Henrik Bengtsson},
##     year = {2023},
##     note = {R package version 1.34.0},
##     url = {https://CRAN.R-project.org/package=parallelly},
##   }
## 
## 
## 
## 
## [[624]]
## 
## To cite package 'parameters' in publications use:
## 
##   Lüdecke D, Ben-Shachar M, Patil I, Makowski D (2020). "Extracting,
##   Computing and Exploring the Parameters of Statistical Models using
##   R." _Journal of Open Source Software_, *5*(53), 2445.
##   doi:10.21105/joss.02445 <https://doi.org/10.21105/joss.02445>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Article{,
##     title = {Extracting, Computing and Exploring the Parameters of Statistical Models using {R}.},
##     volume = {5},
##     doi = {10.21105/joss.02445},
##     number = {53},
##     journal = {Journal of Open Source Software},
##     author = {Daniel Lüdecke and Mattan S. Ben-Shachar and Indrajeet Patil and Dominique Makowski},
##     year = {2020},
##     pages = {2445},
##   }
## 
## 
## [[625]]
## 
## To cite package 'parsnip' in publications use:
## 
##   Kuhn M, Vaughan D (2022). _parsnip: A Common API to Modeling and
##   Analysis Functions_. R package version 1.0.3,
##   <https://CRAN.R-project.org/package=parsnip>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {parsnip: A Common API to Modeling and Analysis Functions},
##     author = {Max Kuhn and Davis Vaughan},
##     year = {2022},
##     note = {R package version 1.0.3},
##     url = {https://CRAN.R-project.org/package=parsnip},
##   }
## 
## 
## 
## 
## [[626]]
## 
## To cite party in publications use:
## 
## If ctree() is used cite:
## 
##   Torsten Hothorn, Kurt Hornik and Achim Zeileis (2006). Unbiased
##   Recursive Partitioning: A Conditional Inference Framework. Journal of
##   Computational and Graphical Statistics, 15(3), 651--674.
## 
## If mob() is used cite:
## 
##   Achim Zeileis, Torsten Hothorn and Kurt Hornik (2008). Model-Based
##   Recursive Partitioning. Journal of Computational and Graphical
##   Statistics, 17(2), 492--514.
## 
## If cforest() is used cite:
## 
##   Torsten Hothorn, Peter Buehlmann, Sandrine Dudoit, Annette Molinaro
##   and Mark Van Der Laan (2006). Survival Ensembles. Biostatistics,
##   7(3), 355--373.
## 
##   Carolin Strobl, Anne-Laure Boulesteix, Achim Zeileis and Torsten
##   Hothorn (2007). Bias in Random Forest Variable Importance Measures:
##   Illustrations, Sources and a Solution. BMC Bioinformatics, 8(25).
## 
##   Carolin Strobl, Anne-Laure Boulesteix, Thomas Kneib, Thomas Augustin
##   and Achim Zeileis (2008). Conditional Variable Importance for Random
##   Forests. BMC Bioinformatics, 9(307).
## 
## To see these entries in BibTeX format, use 'print(<citation>,
## bibtex=TRUE)', 'toBibtex(.)', or set
## 'options(citation.bibtex.max=999)'.
## 
## 
## [[627]]
## 
## To cite package 'pastecs' in publications use:
## 
##   Grosjean P, Ibanez F (2018). _pastecs: Package for Analysis of
##   Space-Time Ecological Series_. R package version 1.3.21,
##   <https://CRAN.R-project.org/package=pastecs>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {pastecs: Package for Analysis of Space-Time Ecological Series},
##     author = {Philippe Grosjean and Frederic Ibanez},
##     year = {2018},
##     note = {R package version 1.3.21},
##     url = {https://CRAN.R-project.org/package=pastecs},
##   }
## 
## 
## 
## 
## [[628]]
## 
## To cite package 'patchwork' in publications use:
## 
##   Pedersen T (2022). _patchwork: The Composer of Plots_. R package
##   version 1.1.2, <https://CRAN.R-project.org/package=patchwork>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {patchwork: The Composer of Plots},
##     author = {Thomas Lin Pedersen},
##     year = {2022},
##     note = {R package version 1.1.2},
##     url = {https://CRAN.R-project.org/package=patchwork},
##   }
## 
## 
## 
## 
## [[629]]
## 
## To cite package 'pbapply' in publications use:
## 
##   Solymos P, Zawadzki Z (2023). _pbapply: Adding Progress Bar to
##   '*apply' Functions_. R package version 1.7-0,
##   <https://CRAN.R-project.org/package=pbapply>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {pbapply: Adding Progress Bar to '*apply' Functions},
##     author = {Peter Solymos and Zygmunt Zawadzki},
##     year = {2023},
##     note = {R package version 1.7-0},
##     url = {https://CRAN.R-project.org/package=pbapply},
##   }
## 
## 
## 
## 
## [[630]]
## 
## To cite package 'pbivnorm' in publications use:
## 
##   Kenkel FcbAGRcbB, package. boAA' (2015). _pbivnorm: Vectorized
##   Bivariate Normal CDF_. R package version 0.6.0,
##   <https://CRAN.R-project.org/package=pbivnorm>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {pbivnorm: Vectorized Bivariate Normal CDF},
##     author = {Fortran code by Alan Genz. R code by Brenton Kenkel and based on Adelchi Azzalini's 'mnormt' package.},
##     year = {2015},
##     note = {R package version 0.6.0},
##     url = {https://CRAN.R-project.org/package=pbivnorm},
##   }
## 
## ATTENTION: This citation information has been auto-generated from the
## package DESCRIPTION file and may need manual editing, see
## 'help("citation")'.
## 
## 
## 
## 
## [[631]]
## 
## To cite pbkrtest in publications use:
## 
##   Ulrich Halekoh, Søren Højsgaard (2014). A Kenward-Roger Approximation
##   and Parametric Bootstrap Methods for Tests in Linear Mixed Models -
##   The R Package pbkrtest. Journal of Statistical Software, 59(9), 1-30.
##   URL https://www.jstatsoft.org/v59/i09/.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Article{,
##     title = {A Kenward-Roger Approximation and Parametric Bootstrap Methods for Tests in Linear Mixed Models -- The {R} Package {pbkrtest}},
##     author = {Ulrich Halekoh and S{\o}ren H{\o}jsgaard},
##     journal = {Journal of Statistical Software},
##     year = {2014},
##     volume = {59},
##     number = {9},
##     pages = {1--30},
##     url = {https://www.jstatsoft.org/v59/i09/},
##   }
## 
## 
## [[632]]
## 
## To cite package 'pcaPP' in publications use:
## 
##   Filzmoser P, Fritz H, Kalcher K (2022). _pcaPP: Robust PCA by
##   Projection Pursuit_. R package version 2.0-3,
##   <https://CRAN.R-project.org/package=pcaPP>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {pcaPP: Robust PCA by Projection Pursuit},
##     author = {Peter Filzmoser and Heinrich Fritz and Klaudius Kalcher},
##     year = {2022},
##     note = {R package version 2.0-3},
##     url = {https://CRAN.R-project.org/package=pcaPP},
##   }
## 
## ATTENTION: This citation information has been auto-generated from the
## package DESCRIPTION file and may need manual editing, see
## 'help("citation")'.
## 
## 
## 
## 
## [[633]]
## 
## To cite package 'performance' in publications use:
## 
##   Lüdecke et al., (2021). performance: An R Package for Assessment,
##   Comparison and Testing of Statistical Models. Journal of Open Source
##   Software, 6(60), 3139. https://doi.org/10.21105/joss.03139
## 
## A BibTeX entry for LaTeX users is
## 
##   @Article{,
##     title = {{performance}: An {R} Package for Assessment, Comparison and Testing of Statistical Models},
##     author = {Daniel Lüdecke and Mattan S. Ben-Shachar and Indrajeet Patil and Philip Waggoner and Dominique Makowski},
##     year = {2021},
##     journal = {Journal of Open Source Software},
##     volume = {6},
##     number = {60},
##     pages = {3139},
##     doi = {10.21105/joss.03139},
##   }
## 
## 
## [[634]]
## 
## To cite package 'PerformanceAnalytics' in publications use:
## 
##   Peterson BG, Carl P (2020). _PerformanceAnalytics: Econometric Tools
##   for Performance and Risk Analysis_. R package version 2.0.4,
##   <https://CRAN.R-project.org/package=PerformanceAnalytics>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {PerformanceAnalytics: Econometric Tools for Performance and Risk Analysis},
##     author = {Brian G. Peterson and Peter Carl},
##     year = {2020},
##     note = {R package version 2.0.4},
##     url = {https://CRAN.R-project.org/package=PerformanceAnalytics},
##   }
## 
## 
## 
## 
## [[635]]
## 
## To cite package 'permute' in publications use:
## 
##   Simpson G (2022). _permute: Functions for Generating Restricted
##   Permutations of Data_. R package version 0.9-7,
##   <https://CRAN.R-project.org/package=permute>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {permute: Functions for Generating Restricted Permutations of Data},
##     author = {Gavin L. Simpson},
##     year = {2022},
##     note = {R package version 0.9-7},
##     url = {https://CRAN.R-project.org/package=permute},
##   }
## 
## 
## 
## 
## [[636]]
## 
## To cite package 'phosphoricons' in publications use:
## 
##   Perrier V, Meyer F (2023). _phosphoricons: 'Phosphor' Icons for R_. R
##   package version 0.2.0,
##   <https://CRAN.R-project.org/package=phosphoricons>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {phosphoricons: 'Phosphor' Icons for R},
##     author = {Victor Perrier and Fanny Meyer},
##     year = {2023},
##     note = {R package version 0.2.0},
##     url = {https://CRAN.R-project.org/package=phosphoricons},
##   }
## 
## 
## 
## 
## [[637]]
## 
## To cite package 'pillar' in publications use:
## 
##   Müller K, Wickham H (2023). _pillar: Coloured Formatting for
##   Columns_. R package version 1.9.0,
##   <https://CRAN.R-project.org/package=pillar>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {pillar: Coloured Formatting for Columns},
##     author = {Kirill Müller and Hadley Wickham},
##     year = {2023},
##     note = {R package version 1.9.0},
##     url = {https://CRAN.R-project.org/package=pillar},
##   }
## 
## 
## 
## 
## [[638]]
## 
## To cite package 'pkgbuild' in publications use:
## 
##   Wickham H, Hester J, Csárdi G (2023). _pkgbuild: Find Tools Needed to
##   Build R Packages_. R package version 1.4.2,
##   <https://CRAN.R-project.org/package=pkgbuild>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {pkgbuild: Find Tools Needed to Build R Packages},
##     author = {Hadley Wickham and Jim Hester and Gábor Csárdi},
##     year = {2023},
##     note = {R package version 1.4.2},
##     url = {https://CRAN.R-project.org/package=pkgbuild},
##   }
## 
## 
## 
## 
## [[639]]
## 
## To cite package 'pkgconfig' in publications use:
## 
##   Csárdi G (2019). _pkgconfig: Private Configuration for 'R' Packages_.
##   R package version 2.0.3,
##   <https://CRAN.R-project.org/package=pkgconfig>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {pkgconfig: Private Configuration for 'R' Packages},
##     author = {Gábor Csárdi},
##     year = {2019},
##     note = {R package version 2.0.3},
##     url = {https://CRAN.R-project.org/package=pkgconfig},
##   }
## 
## ATTENTION: This citation information has been auto-generated from the
## package DESCRIPTION file and may need manual editing, see
## 'help("citation")'.
## 
## 
## 
## 
## [[640]]
## 
## To cite package 'pkgdown' in publications use:
## 
##   Wickham H, Hesselberth J, Salmon M (2022). _pkgdown: Make Static HTML
##   Documentation for a Package_. R package version 2.0.7,
##   <https://CRAN.R-project.org/package=pkgdown>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {pkgdown: Make Static HTML Documentation for a Package},
##     author = {Hadley Wickham and Jay Hesselberth and Maëlle Salmon},
##     year = {2022},
##     note = {R package version 2.0.7},
##     url = {https://CRAN.R-project.org/package=pkgdown},
##   }
## 
## 
## 
## 
## [[641]]
## 
## To cite package 'pkgload' in publications use:
## 
##   Wickham H, Chang W, Hester J, Henry L (2023). _pkgload: Simulate
##   Package Installation and Attach_. R package version 1.3.3,
##   <https://CRAN.R-project.org/package=pkgload>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {pkgload: Simulate Package Installation and Attach},
##     author = {Hadley Wickham and Winston Chang and Jim Hester and Lionel Henry},
##     year = {2023},
##     note = {R package version 1.3.3},
##     url = {https://CRAN.R-project.org/package=pkgload},
##   }
## 
## 
## 
## 
## [[642]]
## 
## To cite plm in publications use:
## 
##   Croissant Y, Millo G (2018). _Panel Data Econometrics with R_. Wiley.
## 
## To cite plm in publications use:
## 
##   Croissant Y, Millo G (2008). "Panel Data Econometrics in R: The plm
##   Package." _Journal of Statistical Software_, *27*(2), 1-43.
##   doi:10.18637/jss.v027.i02 <https://doi.org/10.18637/jss.v027.i02>.
## 
## For the covariance matrix estimators in plm, please cite:
## 
##   Millo G (2017). "Robust Standard Error Estimators for Panel Models: A
##   Unifying Approach." _Journal of Statistical Software_, *82*(3), 1-27.
##   doi:10.18637/jss.v082.i03 <https://doi.org/10.18637/jss.v082.i03>.
## 
## To see these entries in BibTeX format, use 'print(<citation>,
## bibtex=TRUE)', 'toBibtex(.)', or set
## 'options(citation.bibtex.max=999)'.
## 
## 
## [[643]]
## 
## To cite plotly in publications use:
## 
##   C. Sievert. Interactive Web-Based Data Visualization with R, plotly,
##   and shiny. Chapman and Hall/CRC Florida, 2020.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Book{,
##     author = {Carson Sievert},
##     title = {Interactive Web-Based Data Visualization with R, plotly, and shiny},
##     publisher = {Chapman and Hall/CRC},
##     year = {2020},
##     isbn = {9781138331457},
##     url = {https://plotly-r.com},
##   }
## 
## 
## [[644]]
## 
## To cite package 'plotmo' in publications use:
## 
##   Milborrow S (2022). _plotmo: Plot a Model's Residuals, Response, and
##   Partial Dependence Plots_. R package version 3.6.2,
##   <https://CRAN.R-project.org/package=plotmo>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {plotmo: Plot a Model's Residuals, Response, and Partial Dependence Plots},
##     author = {Stephen Milborrow},
##     year = {2022},
##     note = {R package version 3.6.2},
##     url = {https://CRAN.R-project.org/package=plotmo},
##   }
## 
## ATTENTION: This citation information has been auto-generated from the
## package DESCRIPTION file and may need manual editing, see
## 'help("citation")'.
## 
## 
## 
## 
## [[645]]
## 
## To cite package 'plotrix' in publications use:
## 
##   Lemon, J. (2006) Plotrix: a package in the red light district of R.
##   R-News, 6(4): 8-12.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Article{,
##     year = {2006},
##     title = {Plotrix: a package in the red light district of R},
##     journal = {R-News},
##     volume = {6},
##     number = {4},
##     pages = {8-12},
##     author = {Lemon J},
##   }
## 
## 
## [[646]]
## 
## To cite package 'pls' in publications use:
## 
##   Liland K, Mevik B, Wehrens R (2022). _pls: Partial Least Squares and
##   Principal Component Regression_. R package version 2.8-1,
##   <https://CRAN.R-project.org/package=pls>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {pls: Partial Least Squares and Principal Component Regression},
##     author = {Kristian Hovde Liland and Bjørn-Helge Mevik and Ron Wehrens},
##     year = {2022},
##     note = {R package version 2.8-1},
##     url = {https://CRAN.R-project.org/package=pls},
##   }
## 
## 
## 
## 
## [[647]]
## 
## To cite plyr in publications use:
## 
##   Hadley Wickham (2011). The Split-Apply-Combine Strategy for Data
##   Analysis. Journal of Statistical Software, 40(1), 1-29. URL
##   https://www.jstatsoft.org/v40/i01/.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Article{,
##     title = {The Split-Apply-Combine Strategy for Data Analysis},
##     author = {Hadley Wickham},
##     journal = {Journal of Statistical Software},
##     year = {2011},
##     volume = {40},
##     number = {1},
##     pages = {1--29},
##     url = {https://www.jstatsoft.org/v40/i01/},
##   }
## 
## 
## [[648]]
## 
## To cite package 'png' in publications use:
## 
##   Urbanek S (2022). _png: Read and write PNG images_. R package version
##   0.1-8, <https://CRAN.R-project.org/package=png>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {png: Read and write PNG images},
##     author = {Simon Urbanek},
##     year = {2022},
##     note = {R package version 0.1-8},
##     url = {https://CRAN.R-project.org/package=png},
##   }
## 
## ATTENTION: This citation information has been auto-generated from the
## package DESCRIPTION file and may need manual editing, see
## 'help("citation")'.
## 
## 
## 
## 
## [[649]]
## 
## To cite package 'PoEdata' in publications use:
## 
##   Colonescu C (2016). _PoEdata: PoE data for R_. R package version
##   0.1.0.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {PoEdata: PoE data for R},
##     author = {Constantin Colonescu},
##     year = {2016},
##     note = {R package version 0.1.0},
##   }
## 
## 
## 
## 
## [[650]]
## 
## To cite package 'polspline' in publications use:
## 
##   Kooperberg C (2022). _polspline: Polynomial Spline Routines_. R
##   package version 1.1.22,
##   <https://CRAN.R-project.org/package=polspline>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {polspline: Polynomial Spline Routines},
##     author = {Charles Kooperberg},
##     year = {2022},
##     note = {R package version 1.1.22},
##     url = {https://CRAN.R-project.org/package=polspline},
##   }
## 
## 
## 
## 
## [[651]]
## 
## To cite in publications use:
## 
##   Bill Venables and Kurt Hornik and Martin Maechler (2022). polynom: A
##   Collection of Functions to Implement a Class for Univariate
##   Polynomial Manipulations. R package version 1.4-1.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {polynom: A Collection of Functions to Implement a Class for Univariate Polynomial Manipulations},
##     author = {Bill Venables and Kurt Hornik and Martin Maechler},
##     year = {2022},
##     note = {R package version 1.4-1. S original by Bill Venables, packages for R by Kurt Hornik and Martin Maechler.},
##     url = {https://CRAN.R-project.org/package=polynom},
##   }
## 
## 
## [[652]]
## 
## To cite package 'pracma' in publications use:
## 
##   Borchers H (2022). _pracma: Practical Numerical Math Functions_. R
##   package version 2.4.2, <https://CRAN.R-project.org/package=pracma>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {pracma: Practical Numerical Math Functions},
##     author = {Hans W. Borchers},
##     year = {2022},
##     note = {R package version 2.4.2},
##     url = {https://CRAN.R-project.org/package=pracma},
##   }
## 
## 
## 
## 
## [[653]]
## 
## To cite package 'praise' in publications use:
## 
##   Csardi G, Sorhus S (2015). _praise: Praise Users_. R package version
##   1.0.0, <https://CRAN.R-project.org/package=praise>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {praise: Praise Users},
##     author = {Gabor Csardi and Sindre Sorhus},
##     year = {2015},
##     note = {R package version 1.0.0},
##     url = {https://CRAN.R-project.org/package=praise},
##   }
## 
## ATTENTION: This citation information has been auto-generated from the
## package DESCRIPTION file and may need manual editing, see
## 'help("citation")'.
## 
## 
## 
## 
## [[654]]
## 
## To cite package 'prettydoc' in publications use:
## 
##   Qiu Y (2021). _prettydoc: Creating Pretty Documents from R Markdown_.
##   R package version 0.4.1,
##   <https://CRAN.R-project.org/package=prettydoc>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {prettydoc: Creating Pretty Documents from R Markdown},
##     author = {Yixuan Qiu},
##     year = {2021},
##     note = {R package version 0.4.1},
##     url = {https://CRAN.R-project.org/package=prettydoc},
##   }
## 
## 
## 
## 
## [[655]]
## 
## To cite package 'prettyunits' in publications use:
## 
##   Csardi G (2023). _prettyunits: Pretty, Human Readable Formatting of
##   Quantities_. R package version 1.2.0,
##   <https://CRAN.R-project.org/package=prettyunits>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {prettyunits: Pretty, Human Readable Formatting of Quantities},
##     author = {Gabor Csardi},
##     year = {2023},
##     note = {R package version 1.2.0},
##     url = {https://CRAN.R-project.org/package=prettyunits},
##   }
## 
## 
## 
## 
## [[656]]
## 
## To cite package 'prismatic' in publications use:
## 
##   Hvitfeldt E (2022). _prismatic: Color Manipulation Tools_. R package
##   version 1.1.1, <https://CRAN.R-project.org/package=prismatic>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {prismatic: Color Manipulation Tools},
##     author = {Emil Hvitfeldt},
##     year = {2022},
##     note = {R package version 1.1.1},
##     url = {https://CRAN.R-project.org/package=prismatic},
##   }
## 
## 
## 
## 
## [[657]]
## 
## If you use pROC in published research, please cite the following paper:
## 
##   Xavier Robin, Natacha Turck, Alexandre Hainard, Natalia Tiberti,
##   Frédérique Lisacek, Jean-Charles Sanchez and Markus Müller (2011).
##   pROC: an open-source package for R and S+ to analyze and compare ROC
##   curves. BMC Bioinformatics, 12, p. 77.  DOI: 10.1186/1471-2105-12-77
##   <http://www.biomedcentral.com/1471-2105/12/77/>
## 
## A BibTeX entry for LaTeX users is
## 
##   @Article{,
##     title = {pROC: an open-source package for R and S+ to analyze and compare ROC curves},
##     author = {Xavier Robin and Natacha Turck and Alexandre Hainard and Natalia Tiberti and Frédérique Lisacek and Jean-Charles Sanchez and Markus Müller},
##     year = {2011},
##     journal = {BMC Bioinformatics},
##     volume = {12},
##     pages = {77},
##   }
## 
## 
## [[658]]
## 
## To cite package 'processx' in publications use:
## 
##   Csárdi G, Chang W (2023). _processx: Execute and Control System
##   Processes_. R package version 3.8.2,
##   <https://CRAN.R-project.org/package=processx>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {processx: Execute and Control System Processes},
##     author = {Gábor Csárdi and Winston Chang},
##     year = {2023},
##     note = {R package version 3.8.2},
##     url = {https://CRAN.R-project.org/package=processx},
##   }
## 
## 
## 
## 
## [[659]]
## 
## To cite package 'prodlim' in publications use:
## 
##   Gerds TA (2019). _prodlim: Product-Limit Estimation for Censored
##   Event History Analysis_. R package version 2019.11.13,
##   <https://CRAN.R-project.org/package=prodlim>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {prodlim: Product-Limit Estimation for Censored Event History Analysis},
##     author = {Thomas A. Gerds},
##     year = {2019},
##     note = {R package version 2019.11.13},
##     url = {https://CRAN.R-project.org/package=prodlim},
##   }
## 
## ATTENTION: This citation information has been auto-generated from the
## package DESCRIPTION file and may need manual editing, see
## 'help("citation")'.
## 
## 
## 
## 
## [[660]]
## 
## To cite package 'profileModel' in publications use:
## 
##   Kosmidis I (2021). _profileModel: Tools for profiling inference
##   functions for various model classes_. R package version 0.6.1,
##   <https://CRAN.R-project.org/package=profileModel>.
## 
##   Kosmidis I (2008). "The profileModel R package: Profiling objectives
##   for models with linear predictors." _R News_, *8/2*, 12-18.
##   <https://www.r-project.org/doc/Rnews/Rnews_2008-2.pdf>.
## 
## To see these entries in BibTeX format, use 'print(<citation>,
## bibtex=TRUE)', 'toBibtex(.)', or set
## 'options(citation.bibtex.max=999)'.
## 
## 
## [[661]]
## 
## To cite package 'profvis' in publications use:
## 
##   Chang W, Luraschi J, Mastny T (2020). _profvis: Interactive
##   Visualizations for Profiling R Code_. R package version 0.3.7,
##   <https://CRAN.R-project.org/package=profvis>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {profvis: Interactive Visualizations for Profiling R Code},
##     author = {Winston Chang and Javier Luraschi and Timothy Mastny},
##     year = {2020},
##     note = {R package version 0.3.7},
##     url = {https://CRAN.R-project.org/package=profvis},
##   }
## 
## 
## 
## 
## [[662]]
## 
## To cite package 'progress' in publications use:
## 
##   Csárdi G, FitzJohn R (2019). _progress: Terminal Progress Bars_. R
##   package version 1.2.2, <https://CRAN.R-project.org/package=progress>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {progress: Terminal Progress Bars},
##     author = {Gábor Csárdi and Rich FitzJohn},
##     year = {2019},
##     note = {R package version 1.2.2},
##     url = {https://CRAN.R-project.org/package=progress},
##   }
## 
## ATTENTION: This citation information has been auto-generated from the
## package DESCRIPTION file and may need manual editing, see
## 'help("citation")'.
## 
## 
## 
## 
## [[663]]
## 
## To cite package 'progressr' in publications use:
## 
##   Bengtsson H (2023). _progressr: An Inclusive, Unifying API for
##   Progress Updates_. R package version 0.13.0,
##   <https://CRAN.R-project.org/package=progressr>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {progressr: An Inclusive, Unifying API for Progress Updates},
##     author = {Henrik Bengtsson},
##     year = {2023},
##     note = {R package version 0.13.0},
##     url = {https://CRAN.R-project.org/package=progressr},
##   }
## 
## 
## 
## 
## [[664]]
## 
## To cite package 'promises' in publications use:
## 
##   Cheng J (2021). _promises: Abstractions for Promise-Based
##   Asynchronous Programming_. R package version 1.2.0.1,
##   <https://CRAN.R-project.org/package=promises>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {promises: Abstractions for Promise-Based Asynchronous Programming},
##     author = {Joe Cheng},
##     year = {2021},
##     note = {R package version 1.2.0.1},
##     url = {https://CRAN.R-project.org/package=promises},
##   }
## 
## 
## 
## 
## [[665]]
## 
## To cite package 'proxy' in publications use:
## 
##   Meyer D, Buchta C (2022). _proxy: Distance and Similarity Measures_.
##   R package version 0.4-27, <https://CRAN.R-project.org/package=proxy>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {proxy: Distance and Similarity Measures},
##     author = {David Meyer and Christian Buchta},
##     year = {2022},
##     note = {R package version 0.4-27},
##     url = {https://CRAN.R-project.org/package=proxy},
##   }
## 
## 
## 
## 
## [[666]]
## 
## To cite package 'ps' in publications use:
## 
##   Loden J, Daeschler D, Rodola' G, Csárdi G (2023). _ps: List, Query,
##   Manipulate System Processes_. R package version 1.7.5,
##   <https://CRAN.R-project.org/package=ps>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {ps: List, Query, Manipulate System Processes},
##     author = {Jay Loden and Dave Daeschler and Giampaolo Rodola' and Gábor Csárdi},
##     year = {2023},
##     note = {R package version 1.7.5},
##     url = {https://CRAN.R-project.org/package=ps},
##   }
## 
## 
## 
## 
## [[667]]
## 
## To cite pscl/ideal in publications use
## 
##   Simon Jackman (2020). pscl: Classes and Methods for R Developed in
##   the Political Science Computational Laboratory. United States Studies
##   Centre, University of Sydney. Sydney, New South Wales, Australia. R
##   package version 1.5.5. URL https://github.com/atahk/pscl/
## 
## If count data regression models zeroinfl()/hurdle() are used, please
## cite:
## 
##   Achim Zeileis, Christian Kleiber, Simon Jackman (2008). Regression
##   Models for Count Data in R. Journal of Statistical Software 27(8).
##   URL http://www.jstatsoft.org/v27/i08/.
## 
## To see these entries in BibTeX format, use 'print(<citation>,
## bibtex=TRUE)', 'toBibtex(.)', or set
## 'options(citation.bibtex.max=999)'.
## 
## 
## [[668]]
## 
## To cite package 'psych' in publications use:
## 
##   William Revelle (2023). _psych: Procedures for Psychological,
##   Psychometric, and Personality Research_. Northwestern University,
##   Evanston, Illinois. R package version 2.3.6,
##   <https://CRAN.R-project.org/package=psych>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {psych: Procedures for Psychological, Psychometric, and Personality Research},
##     author = {{William Revelle}},
##     organization = {Northwestern University},
##     address = {Evanston, Illinois},
##     year = {2023},
##     note = {R package version 2.3.6},
##     url = {https://CRAN.R-project.org/package=psych},
##   }
## 
## 
## [[669]]
## 
## To cite the psychTools package in publications use:
## 
##   Revelle, W. (2022) psychTools:Tools to Accompany the 'psych' Package
##   for Psychological Research Northwestern University, Evanston,
##   Illinois, USA, https://CRAN.R-project.org/package=psychToolsVersion =
##   2.2.9.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {psychTools:Tools to Accompany the 'psych; Package for Psychological Research },
##     author = {William Revelle},
##     organization = { Northwestern University},
##     address = { Evanston, Illinois},
##     year = {2022},
##     note = {R package version 2.2.9},
##     url = {https://CRAN.R-project.org/package=psychTools},
##   }
## 
## 
## [[670]]
## 
## To cite package 'purrr' in publications use:
## 
##   Wickham H, Henry L (2023). _purrr: Functional Programming Tools_. R
##   package version 1.0.2, <https://CRAN.R-project.org/package=purrr>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {purrr: Functional Programming Tools},
##     author = {Hadley Wickham and Lionel Henry},
##     year = {2023},
##     note = {R package version 1.0.2},
##     url = {https://CRAN.R-project.org/package=purrr},
##   }
## 
## 
## 
## 
## [[671]]
## 
## To cite package 'pyinit' in publications use:
## 
##   Kepplinger D, Salibian-Barrera M, Cohen Freue G (2022). _pyinit:
##   Pena-Yohai Initial Estimator for Robust S-Regression_. R package
##   version 1.1.3, <https://CRAN.R-project.org/package=pyinit>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {pyinit: Pena-Yohai Initial Estimator for Robust S-Regression},
##     author = {David Kepplinger and Matias Salibian-Barrera and Gabriela {Cohen Freue}},
##     year = {2022},
##     note = {R package version 1.1.3},
##     url = {https://CRAN.R-project.org/package=pyinit},
##   }
## 
## 
## 
## 
## [[672]]
## 
## To cite qcc in publications use:
## 
##   Scrucca, L. (2004). qcc: an R package for quality control charting
##   and statistical process control. R News 4/1, 11-17.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Article{,
##     title = {qcc: an R package for quality control charting and statistical process control},
##     author = {Luca Scrucca},
##     journal = {R News},
##     year = {2004},
##     pages = {11--17},
##     volume = {4/1},
##     url = {https://cran.r-project.org/doc/Rnews/},
##   }
## 
## 
## [[673]]
## 
## To cite package 'qqconf' in publications use:
## 
##   Weine E, McPeek M, Mark A (2023). _qqconf: Creates Simultaneous
##   Testing Bands for QQ-Plots_. R package version 1.3.1,
##   <https://CRAN.R-project.org/package=qqconf>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {qqconf: Creates Simultaneous Testing Bands for QQ-Plots},
##     author = {Eric Weine and Mary Sara McPeek and Abney Mark},
##     year = {2023},
##     note = {R package version 1.3.1},
##     url = {https://CRAN.R-project.org/package=qqconf},
##   }
## 
## 
## 
## 
## [[674]]
## 
## To cite qqplotr in publications, please use:
## 
##   Almeida, Loy & Hofmann (2018). ggplot2 Compatible Quantile-Quantile
##   Plots in R. The R Journal, 10(2), 248-261. URL 248--261.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {{ggplot2} Compatible Quantile-Quantile Plots in R},
##     author = {Alexandre Almeida and Adam Loy and Heike Hofmann},
##     journal = {The R Journal},
##     url = {https://doi.org/10.32614/RJ-2018-051},
##     year = {2018},
##     pages = {248--261},
##     volume = {10},
##     number = {2},
##   }
## 
## 
## [[675]]
## 
## To cite package 'quadprog' in publications use:
## 
##   dpodi/LINPACK) SobBATRpbAW<FcfCM (2019). _quadprog: Functions to
##   Solve Quadratic Programming Problems_. R package version 1.5-8,
##   <https://CRAN.R-project.org/package=quadprog>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {quadprog: Functions to Solve Quadratic Programming Problems},
##     author = {S original by Berwin A. Turlach R port by Andreas Weingessel <Andreas.Weingessel@ci.tuwien.ac.at> Fortran contributions from Cleve Moler dpodi/LINPACK)},
##     year = {2019},
##     note = {R package version 1.5-8},
##     url = {https://CRAN.R-project.org/package=quadprog},
##   }
## 
## ATTENTION: This citation information has been auto-generated from the
## package DESCRIPTION file and may need manual editing, see
## 'help("citation")'.
## 
## 
## 
## 
## [[676]]
## 
## To cite package 'quantmod' in publications use:
## 
##   Ryan JA, Ulrich JM (2023). _quantmod: Quantitative Financial
##   Modelling Framework_. R package version 0.4.25,
##   <https://CRAN.R-project.org/package=quantmod>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {quantmod: Quantitative Financial Modelling Framework},
##     author = {Jeffrey A. Ryan and Joshua M. Ulrich},
##     year = {2023},
##     note = {R package version 0.4.25},
##     url = {https://CRAN.R-project.org/package=quantmod},
##   }
## 
## 
## 
## 
## [[677]]
## 
## To cite package 'quantreg' in publications use:
## 
##   Koenker R (2022). _quantreg: Quantile Regression_. R package version
##   5.94, <https://CRAN.R-project.org/package=quantreg>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {quantreg: Quantile Regression},
##     author = {Roger Koenker},
##     year = {2022},
##     note = {R package version 5.94},
##     url = {https://CRAN.R-project.org/package=quantreg},
##   }
## 
## 
## 
## 
## [[678]]
## 
## To cite package 'quarto' in publications use:
## 
##   Allaire J (2022). _quarto: R Interface to 'Quarto' Markdown
##   Publishing System_. R package version 1.2,
##   <https://CRAN.R-project.org/package=quarto>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {quarto: R Interface to 'Quarto' Markdown Publishing System},
##     author = {JJ Allaire},
##     year = {2022},
##     note = {R package version 1.2},
##     url = {https://CRAN.R-project.org/package=quarto},
##   }
## 
## 
## 
## 
## [[679]]
## 
## To cite package 'questionr' in publications use:
## 
##   Barnier J, Briatte F, Larmarange J (2022). _questionr: Functions to
##   Make Surveys Processing Easier_. R package version 0.7.7,
##   <https://CRAN.R-project.org/package=questionr>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {questionr: Functions to Make Surveys Processing Easier},
##     author = {Julien Barnier and François Briatte and Joseph Larmarange},
##     year = {2022},
##     note = {R package version 0.7.7},
##     url = {https://CRAN.R-project.org/package=questionr},
##   }
## 
## 
## 
## 
## [[680]]
## 
## To cite package 'qvcalc' in publications use:
## 
##   Firth D (2020). _qvcalc: Quasi Variances for Factor Effects in
##   Statistical Models_. R package version 1.0.2,
##   <https://CRAN.R-project.org/package=qvcalc>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {qvcalc: Quasi Variances for Factor Effects in Statistical Models},
##     author = {David Firth},
##     year = {2020},
##     note = {R package version 1.0.2},
##     url = {https://CRAN.R-project.org/package=qvcalc},
##   }
## 
## ATTENTION: This citation information has been auto-generated from the
## package DESCRIPTION file and may need manual editing, see
## 'help("citation")'.
## 
## 
## 
## 
## [[681]]
## 
## To cite package 'R.cache' in publications use:
## 
##   Bengtsson H (2022). _R.cache: Fast and Light-Weight Caching
##   (Memoization) of Objects and Results to Speed Up Computations_. R
##   package version 0.16.0, <https://CRAN.R-project.org/package=R.cache>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {R.cache: Fast and Light-Weight Caching (Memoization) of Objects and
## Results to Speed Up Computations},
##     author = {Henrik Bengtsson},
##     year = {2022},
##     note = {R package version 0.16.0},
##     url = {https://CRAN.R-project.org/package=R.cache},
##   }
## 
## 
## 
## 
## [[682]]
## 
## Please cite R.oo/R.methodsS3 as
## 
##   Bengtsson, H. The R.oo package - Object-Oriented Programming with
##   References Using Standard R Code, Proceedings of the 3rd
##   International Workshop on Distributed Statistical Computing (DSC
##   2003), ISSN 1609-395X, Hornik, K.; Leisch, F. & Zeileis, A. (ed.),
##   2003
## 
## A BibTeX entry for LaTeX users is
## 
##   @InProceedings{,
##     author = {Henrik Bengtsson},
##     title = {The {R.oo} package - Object-Oriented Programming with References Using Standard {R} Code},
##     booktitle = {Proceedings of the 3rd International Workshop on Distributed Statistical Computing (DSC 2003)},
##     year = {2003},
##     editor = {Kurt Hornik and Friedrich Leisch and Achim Zeileis},
##     address = {Vienna, Austria},
##     month = {March},
##     issn = {1609-395X},
##     url = {https://www.r-project.org/conferences/DSC-2003/Proceedings/Bengtsson.pdf},
##     howpublished = {https://www.r-project.org/conferences/DSC-2003/Proceedings/},
##   }
## 
## 
## [[683]]
## 
## Please cite R.oo/R.methodsS3 as
## 
##   Bengtsson, H. The R.oo package - Object-Oriented Programming with
##   References Using Standard R Code, Proceedings of the 3rd
##   International Workshop on Distributed Statistical Computing (DSC
##   2003), ISSN 1609-395X, Hornik, K.; Leisch, F. & Zeileis, A. (ed.),
##   2003
## 
## A BibTeX entry for LaTeX users is
## 
##   @InProceedings{,
##     author = {Henrik Bengtsson},
##     title = {The {R.oo} package - Object-Oriented Programming with References Using Standard {R} Code},
##     booktitle = {Proceedings of the 3rd International Workshop on Distributed Statistical Computing (DSC 2003)},
##     year = {2003},
##     editor = {Kurt Hornik and Friedrich Leisch and Achim Zeileis},
##     address = {Vienna, Austria},
##     month = {March},
##     issn = {1609-395X},
##     url = {https://www.r-project.org/conferences/DSC-2003/Proceedings/Bengtsson.pdf},
##     howpublished = {https://www.r-project.org/conferences/DSC-2003/Proceedings/},
##   }
## 
## 
## [[684]]
## 
## To cite package 'R.rsp' in publications use:
## 
##   Bengtsson H (2022). _R.rsp: Dynamic Generation of Scientific
##   Reports_. R package version 0.45.0,
##   <https://CRAN.R-project.org/package=R.rsp>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {R.rsp: Dynamic Generation of Scientific Reports},
##     author = {Henrik Bengtsson},
##     year = {2022},
##     note = {R package version 0.45.0},
##     url = {https://CRAN.R-project.org/package=R.rsp},
##   }
## 
## 
## 
## 
## [[685]]
## 
## To cite package 'R.utils' in publications use:
## 
##   Bengtsson H (2022). _R.utils: Various Programming Utilities_. R
##   package version 2.12.2, <https://CRAN.R-project.org/package=R.utils>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {R.utils: Various Programming Utilities},
##     author = {Henrik Bengtsson},
##     year = {2022},
##     note = {R package version 2.12.2},
##     url = {https://CRAN.R-project.org/package=R.utils},
##   }
## 
## 
## 
## 
## [[686]]
## 
## To cite package 'R6' in publications use:
## 
##   Chang W (2021). _R6: Encapsulated Classes with Reference Semantics_.
##   R package version 2.5.1, <https://CRAN.R-project.org/package=R6>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {R6: Encapsulated Classes with Reference Semantics},
##     author = {Winston Chang},
##     year = {2021},
##     note = {R package version 2.5.1},
##     url = {https://CRAN.R-project.org/package=R6},
##   }
## 
## 
## 
## 
## [[687]]
## 
## To cite package 'ragg' in publications use:
## 
##   Pedersen T, Shemanarev M (2023). _ragg: Graphic Devices Based on
##   AGG_. R package version 1.2.5,
##   <https://CRAN.R-project.org/package=ragg>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {ragg: Graphic Devices Based on AGG},
##     author = {Thomas Lin Pedersen and Maxim Shemanarev},
##     year = {2023},
##     note = {R package version 1.2.5},
##     url = {https://CRAN.R-project.org/package=ragg},
##   }
## 
## 
## 
## 
## [[688]]
## 
## To cite randomForest in publications use:
## 
##   A. Liaw and M. Wiener (2002). Classification and Regression by
##   randomForest. R News 2(3), 18--22.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Article{,
##     title = {Classification and Regression by randomForest},
##     author = {Andy Liaw and Matthew Wiener},
##     journal = {R News},
##     year = {2002},
##     volume = {2},
##     number = {3},
##     pages = {18-22},
##     url = {https://CRAN.R-project.org/doc/Rnews/},
##   }
## 
## 
## [[689]]
## 
## To cite ranger in publications use:
## 
##   Marvin N. Wright, Andreas Ziegler (2017). ranger: A Fast
##   Implementation of Random Forests for High Dimensional Data in C++ and
##   R. Journal of Statistical Software, 77(1), 1-17.
##   doi:10.18637/jss.v077.i01
## 
## A BibTeX entry for LaTeX users is
## 
##   @Article{,
##     title = {{ranger}: A Fast Implementation of Random Forests for High Dimensional Data in {C++} and {R}},
##     author = {Marvin N. Wright and Andreas Ziegler},
##     journal = {Journal of Statistical Software},
##     year = {2017},
##     volume = {77},
##     number = {1},
##     pages = {1--17},
##     doi = {10.18637/jss.v077.i01},
##   }
## 
## 
## 
## 
## [[690]]
## 
## To cite package 'RANN' in publications use:
## 
##   Arya S, Mount D, Kemp SE, Jefferis G (2019). _RANN: Fast Nearest
##   Neighbour Search (Wraps ANN Library) Using L2 Metric_. R package
##   version 2.6.1, <https://CRAN.R-project.org/package=RANN>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {RANN: Fast Nearest Neighbour Search (Wraps ANN Library) Using L2
## Metric},
##     author = {Sunil Arya and David Mount and Samuel E. Kemp and Gregory Jefferis},
##     year = {2019},
##     note = {R package version 2.6.1},
##     url = {https://CRAN.R-project.org/package=RANN},
##   }
## 
## ATTENTION: This citation information has been auto-generated from the
## package DESCRIPTION file and may need manual editing, see
## 'help("citation")'.
## 
## 
## 
## 
## [[691]]
## 
## To cite package 'rappdirs' in publications use:
## 
##   Ratnakumar S, Mick T, Davis T (2021). _rappdirs: Application
##   Directories: Determine Where to Save Data, Caches, and Logs_. R
##   package version 0.3.3, <https://CRAN.R-project.org/package=rappdirs>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {rappdirs: Application Directories: Determine Where to Save Data, Caches,
## and Logs},
##     author = {Sridhar Ratnakumar and Trent Mick and Trevor Davis},
##     year = {2021},
##     note = {R package version 0.3.3},
##     url = {https://CRAN.R-project.org/package=rappdirs},
##   }
## 
## 
## 
## 
## [[692]]
## 
## To cite package 'raster' in publications use:
## 
##   Hijmans R (2023). _raster: Geographic Data Analysis and Modeling_. R
##   package version 3.6-14, <https://CRAN.R-project.org/package=raster>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {raster: Geographic Data Analysis and Modeling},
##     author = {Robert J. Hijmans},
##     year = {2023},
##     note = {R package version 3.6-14},
##     url = {https://CRAN.R-project.org/package=raster},
##   }
## 
## 
## 
## 
## [[693]]
## 
## To cite package 'rbibutils' in publications use:
## 
##   Boshnakov GN, Putman C (2023). _rbibutils: Read 'Bibtex' Files and
##   Convert Between Bibliography Formats_. R package version 2.2.13,
##   <https://CRAN.R-project.org/package=rbibutils>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {rbibutils: Read 'Bibtex' Files and Convert Between Bibliography Formats},
##     author = {Georgi N. Boshnakov and Chris Putman},
##     year = {2023},
##     note = {R package version 2.2.13},
##     url = {https://CRAN.R-project.org/package=rbibutils},
##   }
## 
## 
## 
## 
## [[694]]
## 
## To cite package 'rcmdcheck' in publications use:
## 
##   Csárdi G (2021). _rcmdcheck: Run 'R CMD check' from 'R' and Capture
##   Results_. R package version 1.4.0,
##   <https://CRAN.R-project.org/package=rcmdcheck>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {rcmdcheck: Run 'R CMD check' from 'R' and Capture Results},
##     author = {Gábor Csárdi},
##     year = {2021},
##     note = {R package version 1.4.0},
##     url = {https://CRAN.R-project.org/package=rcmdcheck},
##   }
## 
## 
## 
## 
## [[695]]
## 
## To cite package 'RColorBrewer' in publications use:
## 
##   Neuwirth E (2022). _RColorBrewer: ColorBrewer Palettes_. R package
##   version 1.1-3, <https://CRAN.R-project.org/package=RColorBrewer>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {RColorBrewer: ColorBrewer Palettes},
##     author = {Erich Neuwirth},
##     year = {2022},
##     note = {R package version 1.1-3},
##     url = {https://CRAN.R-project.org/package=RColorBrewer},
##   }
## 
## 
## 
## 
## [[696]]
## 
## To cite package 'Rcpp' in publications use:
## 
##   Eddelbuettel D, Francois R, Allaire J, Ushey K, Kou Q, Russell N,
##   Ucar I, Bates D, Chambers J (2023). _Rcpp: Seamless R and C++
##   Integration_. R package version 1.0.11,
##   <https://CRAN.R-project.org/package=Rcpp>.
## 
##   Eddelbuettel D, François R (2011). "Rcpp: Seamless R and C++
##   Integration." _Journal of Statistical Software_, *40*(8), 1-18.
##   doi:10.18637/jss.v040.i08 <https://doi.org/10.18637/jss.v040.i08>.
## 
##   Eddelbuettel D (2013). _Seamless R and C++ Integration with Rcpp_.
##   Springer, New York. doi:10.1007/978-1-4614-6868-4
##   <https://doi.org/10.1007/978-1-4614-6868-4>, ISBN 978-1-4614-6867-7.
## 
##   Eddelbuettel D, Balamuta J (2018). "Extending R with C++: A Brief
##   Introduction to Rcpp." _The American Statistician_, *72*(1), 28-36.
##   doi:10.1080/00031305.2017.1375990
##   <https://doi.org/10.1080/00031305.2017.1375990>.
## 
## To see these entries in BibTeX format, use 'print(<citation>,
## bibtex=TRUE)', 'toBibtex(.)', or set
## 'options(citation.bibtex.max=999)'.
## 
## 
## [[697]]
## 
## To cite package 'RcppArmadillo' in publications use:
## 
##   Eddelbuettel D, Francois R, Bates D, Ni B, Sanderson C (2023).
##   _RcppArmadillo: 'Rcpp' Integration for the 'Armadillo' Templated
##   Linear Algebra Library_. R package version 0.12.6.4.0,
##   <https://CRAN.R-project.org/package=RcppArmadillo>.
## 
##   Eddelbuettel D, Sanderson C (2014). "RcppArmadillo: Accelerating R
##   with high-performance C++ linear algebra." _Computational Statistics
##   and Data Analysis_, *71*, 1054-1063. doi:10.1016/j.csda.2013.02.005
##   <https://doi.org/10.1016/j.csda.2013.02.005>.
## 
## To see these entries in BibTeX format, use 'print(<citation>,
## bibtex=TRUE)', 'toBibtex(.)', or set
## 'options(citation.bibtex.max=999)'.
## 
## 
## [[698]]
## 
## To cite RcppEigen in publications use:
## 
##   Douglas Bates, Dirk Eddelbuettel (2013). Fast and Elegant Numerical
##   Linear Algebra Using the RcppEigen Package. Journal of Statistical
##   Software, 52(5), 1-24, <doi:10.18637/jss.v052.i05>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Article{,
##     title = {Fast and Elegant Numerical Linear Algebra Using the {RcppEigen} Package},
##     author = {Douglas Bates and Dirk Eddelbuettel},
##     journal = {Journal of Statistical Software},
##     year = {2013},
##     volume = {52},
##     number = {5},
##     pages = {1--24},
##     doi = {10.18637/jss.v052.i05},
##   }
## 
## 
## [[699]]
## 
## To cite package 'RcppTOML' in publications use:
## 
##   Eddelbuettel D (2020). _RcppTOML: 'Rcpp' Bindings to Parser for Tom's
##   Obvious Markup Language_. R package version 0.1.7,
##   <https://CRAN.R-project.org/package=RcppTOML>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {RcppTOML: 'Rcpp' Bindings to Parser for Tom's Obvious Markup Language},
##     author = {Dirk Eddelbuettel},
##     year = {2020},
##     note = {R package version 0.1.7},
##     url = {https://CRAN.R-project.org/package=RcppTOML},
##   }
## 
## ATTENTION: This citation information has been auto-generated from the
## package DESCRIPTION file and may need manual editing, see
## 'help("citation")'.
## 
## 
## 
## 
## [[700]]
## 
## To cite package 'Rcsdp' in publications use:
## 
##   Corrada Bravo H, Borchers B (2022). _Rcsdp: R Interface to the CSDP
##   Semidefinite Programming Library_. R package version 0.1.57.4,
##   <https://CRAN.R-project.org/package=Rcsdp>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {Rcsdp: R Interface to the CSDP Semidefinite Programming Library},
##     author = {Hector {Corrada Bravo} and Brian Borchers},
##     year = {2022},
##     note = {R package version 0.1.57.4},
##     url = {https://CRAN.R-project.org/package=Rcsdp},
##   }
## 
## 
## 
## 
## [[701]]
## 
## To cite package 'RCurl' in publications use:
## 
##   Temple Lang D (2022). _RCurl: General Network (HTTP/FTP/...) Client
##   Interface for R_. R package version 1.98-1.9,
##   <https://CRAN.R-project.org/package=RCurl>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {RCurl: General Network (HTTP/FTP/...) Client Interface for R},
##     author = {Duncan {Temple Lang}},
##     year = {2022},
##     note = {R package version 1.98-1.9},
##     url = {https://CRAN.R-project.org/package=RCurl},
##   }
## 
## 
## 
## 
## [[702]]
## 
## To cite package 'rdd' in publications use:
## 
##   Dimmery D (2016). _rdd: Regression Discontinuity Estimation_. R
##   package version 0.57, <https://CRAN.R-project.org/package=rdd>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {rdd: Regression Discontinuity Estimation},
##     author = {Drew Dimmery},
##     year = {2016},
##     note = {R package version 0.57},
##     url = {https://CRAN.R-project.org/package=rdd},
##   }
## 
## ATTENTION: This citation information has been auto-generated from the
## package DESCRIPTION file and may need manual editing, see
## 'help("citation")'.
## 
## 
## 
## 
## [[703]]
## 
## To cite rddtools in publications please use:
## 
##   Stigler, M. and B. Quast, B (2016). rddtools: A toolbox for
##   regression discontinuity in R.
## 
## A BibTeX entry for LaTeX users is
## 
##   @TechReport{,
##     title = {rddtools: A toolbox for regression discontinuity in R},
##     author = {Matthieu Stigler and Bastiaan Quast},
##     institution = {The Graduate Institute},
##     address = {Maison de la paix, Geneva, Switzerland},
##     year = {2016},
##     url = {https://qua.st/rddtools/},
##   }
## 
## We have invested a lot of time and effort in creating rddtools, please
## cite it when using it for data analysis. See also 'citation()' for
## citing R.
## 
## 
## [[704]]
## 
## To cite the 'Rdpack' package in publications use:
## 
##   Boshnakov GN (2022). "Rdpack: Update and Manipulate Rd Documentation
##   Objects." doi:10.5281/zenodo.3925612
##   <https://doi.org/10.5281/zenodo.3925612>, R package version 2.4.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Misc{,
##     title = {{Rdpack}: Update and Manipulate Rd Documentation Objects},
##     author = {Georgi N. Boshnakov},
##     year = {2022},
##     note = {R package version 2.4},
##     doi = {10.5281/zenodo.3925612},
##   }
## 
## 
## [[705]]
## 
## To cite package 'rdrobust' in publications use:
## 
##   Calonico S, Cattaneo MD, Farrell MH, Titiunik R (2022). _rdrobust:
##   Robust Data-Driven Statistical Inference in Regression-Discontinuity
##   Designs_. R package version 2.1.1,
##   <https://CRAN.R-project.org/package=rdrobust>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {rdrobust: Robust Data-Driven Statistical Inference in
## Regression-Discontinuity Designs},
##     author = {Sebastian Calonico and Matias D. Cattaneo and Max H. Farrell and Rocio Titiunik},
##     year = {2022},
##     note = {R package version 2.1.1},
##     url = {https://CRAN.R-project.org/package=rdrobust},
##   }
## 
## ATTENTION: This citation information has been auto-generated from the
## package DESCRIPTION file and may need manual editing, see
## 'help("citation")'.
## 
## 
## 
## 
## [[706]]
## 
## To cite package 'reactable' in publications use:
## 
##   Lin G (2023). _reactable: Interactive Data Tables for R_. R package
##   version 0.4.3, <https://CRAN.R-project.org/package=reactable>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {reactable: Interactive Data Tables for R},
##     author = {Greg Lin},
##     year = {2023},
##     note = {R package version 0.4.3},
##     url = {https://CRAN.R-project.org/package=reactable},
##   }
## 
## 
## 
## 
## [[707]]
## 
## To cite package 'reactR' in publications use:
## 
##   Inc F, Weststrate M, Russell K, Dipert A (2021). _reactR: React
##   Helpers_. R package version 0.4.4,
##   <https://CRAN.R-project.org/package=reactR>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {reactR: React Helpers},
##     author = {Facebook Inc and Michel Weststrate and Kent Russell and Alan Dipert},
##     year = {2021},
##     note = {R package version 0.4.4},
##     url = {https://CRAN.R-project.org/package=reactR},
##   }
## 
## 
## 
## 
## [[708]]
## 
## To cite package 'readr' in publications use:
## 
##   Wickham H, Hester J, Bryan J (2023). _readr: Read Rectangular Text
##   Data_. R package version 2.1.4,
##   <https://CRAN.R-project.org/package=readr>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {readr: Read Rectangular Text Data},
##     author = {Hadley Wickham and Jim Hester and Jennifer Bryan},
##     year = {2023},
##     note = {R package version 2.1.4},
##     url = {https://CRAN.R-project.org/package=readr},
##   }
## 
## 
## 
## 
## [[709]]
## 
## To cite package 'readsdmx' in publications use:
## 
##   de Queljoe M (2019). _readsdmx: Read SDMX-XML Data_. R package
##   version 0.3.0, <https://CRAN.R-project.org/package=readsdmx>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {readsdmx: Read SDMX-XML Data},
##     author = {Matthew {de Queljoe}},
##     year = {2019},
##     note = {R package version 0.3.0},
##     url = {https://CRAN.R-project.org/package=readsdmx},
##   }
## 
## 
## 
## 
## [[710]]
## 
## To cite package 'readxl' in publications use:
## 
##   Wickham H, Bryan J (2023). _readxl: Read Excel Files_. R package
##   version 1.4.3, <https://CRAN.R-project.org/package=readxl>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {readxl: Read Excel Files},
##     author = {Hadley Wickham and Jennifer Bryan},
##     year = {2023},
##     note = {R package version 1.4.3},
##     url = {https://CRAN.R-project.org/package=readxl},
##   }
## 
## 
## 
## 
## [[711]]
## 
## To cite package 'recipes' in publications use:
## 
##   Kuhn M, Wickham H (2023). _recipes: Preprocessing and Feature
##   Engineering Steps for Modeling_. R package version 1.0.4,
##   <https://CRAN.R-project.org/package=recipes>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {recipes: Preprocessing and Feature Engineering Steps for Modeling},
##     author = {Max Kuhn and Hadley Wickham},
##     year = {2023},
##     note = {R package version 1.0.4},
##     url = {https://CRAN.R-project.org/package=recipes},
##   }
## 
## 
## 
## 
## [[712]]
## 
## To cite package 'regclass' in publications use:
## 
##   Petrie A (2020). _regclass: Tools for an Introductory Class in
##   Regression and Modeling_. R package version 1.6,
##   <https://CRAN.R-project.org/package=regclass>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {regclass: Tools for an Introductory Class in Regression and Modeling},
##     author = {Adam Petrie},
##     year = {2020},
##     note = {R package version 1.6},
##     url = {https://CRAN.R-project.org/package=regclass},
##   }
## 
## ATTENTION: This citation information has been auto-generated from the
## package DESCRIPTION file and may need manual editing, see
## 'help("citation")'.
## 
## 
## 
## 
## [[713]]
## 
## To cite package 'rematch' in publications use:
## 
##   Csardi G (2016). _rematch: Match Regular Expressions with a Nicer
##   'API'_. R package version 1.0.1,
##   <https://CRAN.R-project.org/package=rematch>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {rematch: Match Regular Expressions with a Nicer 'API'},
##     author = {Gabor Csardi},
##     year = {2016},
##     note = {R package version 1.0.1},
##     url = {https://CRAN.R-project.org/package=rematch},
##   }
## 
## ATTENTION: This citation information has been auto-generated from the
## package DESCRIPTION file and may need manual editing, see
## 'help("citation")'.
## 
## 
## 
## 
## [[714]]
## 
## To cite package 'rematch2' in publications use:
## 
##   Csárdi G (2020). _rematch2: Tidy Output from Regular Expression
##   Matching_. R package version 2.1.2,
##   <https://CRAN.R-project.org/package=rematch2>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {rematch2: Tidy Output from Regular Expression Matching},
##     author = {Gábor Csárdi},
##     year = {2020},
##     note = {R package version 2.1.2},
##     url = {https://CRAN.R-project.org/package=rematch2},
##   }
## 
## 
## 
## 
## [[715]]
## 
## To cite package 'remotes' in publications use:
## 
##   Csárdi G, Hester J, Wickham H, Chang W, Morgan M, Tenenbaum D (2021).
##   _remotes: R Package Installation from Remote Repositories, Including
##   'GitHub'_. R package version 2.4.2,
##   <https://CRAN.R-project.org/package=remotes>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {remotes: R Package Installation from Remote Repositories, Including
## 'GitHub'},
##     author = {Gábor Csárdi and Jim Hester and Hadley Wickham and Winston Chang and Martin Morgan and Dan Tenenbaum},
##     year = {2021},
##     note = {R package version 2.4.2},
##     url = {https://CRAN.R-project.org/package=remotes},
##   }
## 
## 
## 
## 
## [[716]]
## 
## To cite package 'repr' in publications use:
## 
##   Angerer P, Kluyver T, Schulz J (2023). _repr: Serializable
##   Representations_. R package version 1.1.6,
##   <https://CRAN.R-project.org/package=repr>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {repr: Serializable Representations},
##     author = {Philipp Angerer and Thomas Kluyver and Jan Schulz},
##     year = {2023},
##     note = {R package version 1.1.6},
##     url = {https://CRAN.R-project.org/package=repr},
##   }
## 
## 
## 
## 
## [[717]]
## 
## To cite package 'reprex' in publications use:
## 
##   Bryan J, Hester J, Robinson D, Wickham H, Dervieux C (2022). _reprex:
##   Prepare Reproducible Example Code via the Clipboard_. R package
##   version 2.0.2, <https://CRAN.R-project.org/package=reprex>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {reprex: Prepare Reproducible Example Code via the Clipboard},
##     author = {Jennifer Bryan and Jim Hester and David Robinson and Hadley Wickham and Christophe Dervieux},
##     year = {2022},
##     note = {R package version 2.0.2},
##     url = {https://CRAN.R-project.org/package=reprex},
##   }
## 
## 
## 
## 
## [[718]]
## 
## To cite reshape in publications, please use:
## 
##   H. Wickham. Reshaping data with the reshape package. Journal of
##   Statistical Software, 21(12), 2007.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Article{,
##     author = {Hadley Wickham},
##     journal = {Journal of Statistical Software},
##     number = {12},
##     title = {Reshaping data with the reshape package},
##     url = {https://www.jstatsoft.org/v21/i12/},
##     volume = {21},
##     year = {2007},
##   }
## 
## 
## [[719]]
## 
## To cite reshape2 in publications use:
## 
##   Hadley Wickham (2007). Reshaping Data with the reshape Package.
##   Journal of Statistical Software, 21(12), 1-20. URL
##   http://www.jstatsoft.org/v21/i12/.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Article{,
##     title = {Reshaping Data with the {reshape} Package},
##     author = {Hadley Wickham},
##     journal = {Journal of Statistical Software},
##     year = {2007},
##     volume = {21},
##     number = {12},
##     pages = {1--20},
##     url = {http://www.jstatsoft.org/v21/i12/},
##   }
## 
## 
## [[720]]
## 
## To cite package 'ResourceSelection' in publications use:
## 
##   Lele SR, Keim JL, Solymos P (2019). _ResourceSelection: Resource
##   Selection (Probability) Functions for Use-Availability Data_. R
##   package version 0.3-5,
##   <https://CRAN.R-project.org/package=ResourceSelection>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {ResourceSelection: Resource Selection (Probability) Functions for Use-Availability
## Data},
##     author = {Subhash R. Lele and Jonah L. Keim and Peter Solymos},
##     year = {2019},
##     note = {R package version 0.3-5},
##     url = {https://CRAN.R-project.org/package=ResourceSelection},
##   }
## 
## 
## 
## 
## [[721]]
## 
## To cite package 'reticulate' in publications use:
## 
##   Ushey K, Allaire J, Tang Y (2023). _reticulate: Interface to
##   'Python'_. R package version 1.27,
##   <https://CRAN.R-project.org/package=reticulate>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {reticulate: Interface to 'Python'},
##     author = {Kevin Ushey and JJ Allaire and Yuan Tang},
##     year = {2023},
##     note = {R package version 1.27},
##     url = {https://CRAN.R-project.org/package=reticulate},
##   }
## 
## 
## 
## 
## [[722]]
## 
## To cite package 'rex' in publications use:
## 
##   Ushey K, Hester J, Krzyzanowski R (2021). _rex: Friendly Regular
##   Expressions_. R package version 1.2.1,
##   <https://CRAN.R-project.org/package=rex>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {rex: Friendly Regular Expressions},
##     author = {Kevin Ushey and Jim Hester and Robert Krzyzanowski},
##     year = {2021},
##     note = {R package version 1.2.1},
##     url = {https://CRAN.R-project.org/package=rex},
##   }
## 
## 
## 
## 
## [[723]]
## 
## To cite package 'Rgraphviz' in publications use:
## 
##   Hansen KD, Gentry J, Long L, Gentleman R, Falcon S, Hahne F, Sarkar D
##   (2022). _Rgraphviz: Provides plotting capabilities for R graph
##   objects_. R package version 2.40.0.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {Rgraphviz: Provides plotting capabilities for R graph objects},
##     author = {Kasper Daniel Hansen and Jeff Gentry and Li Long and Robert Gentleman and Seth Falcon and Florian Hahne and Deepayan Sarkar},
##     year = {2022},
##     note = {R package version 2.40.0},
##   }
## 
## 
## 
## 
## [[724]]
## 
## To cite package 'rio' in publications use:
## 
##   Chung-hong Chan, Geoffrey CH Chan, Thomas J. Leeper, and Jason Becker
##   (2021). rio: A Swiss-army knife for data file I/O. R package version
##   0.5.29.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {rio: A Swiss-army knife for data file I/O},
##     author = {Chung-hong Chan and Geoffrey CH Chan and Thomas J. Leeper and Jason Becker},
##     year = {2021},
##     note = {R package version 0.5.29},
##   }
## 
## 
## [[725]]
## 
## To cite package 'RJSONIO' in publications use:
## 
##   Temple Lang D, Wallace J (2023). _RJSONIO: Serialize R Objects to
##   JSON, JavaScript Object Notation_. R package version 1.3-1.8,
##   <https://CRAN.R-project.org/package=RJSONIO>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {RJSONIO: Serialize R Objects to JSON, JavaScript Object Notation},
##     author = {Duncan {Temple Lang} and Jonathan Wallace},
##     year = {2023},
##     note = {R package version 1.3-1.8},
##     url = {https://CRAN.R-project.org/package=RJSONIO},
##   }
## 
## 
## 
## 
## [[726]]
## 
## To cite package 'rlang' in publications use:
## 
##   Henry L, Wickham H (2023). _rlang: Functions for Base Types and Core
##   R and 'Tidyverse' Features_. R package version 1.1.2,
##   <https://CRAN.R-project.org/package=rlang>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {rlang: Functions for Base Types and Core R and 'Tidyverse' Features},
##     author = {Lionel Henry and Hadley Wickham},
##     year = {2023},
##     note = {R package version 1.1.2},
##     url = {https://CRAN.R-project.org/package=rlang},
##   }
## 
## 
## 
## 
## [[727]]
## 
## To cite package 'rmarkdown' in publications use:
## 
##   Allaire J, Xie Y, Dervieux C, McPherson J, Luraschi J, Ushey K,
##   Atkins A, Wickham H, Cheng J, Chang W, Iannone R (2023). _rmarkdown:
##   Dynamic Documents for R_. R package version 2.21,
##   <https://github.com/rstudio/rmarkdown>.
## 
##   Xie Y, Allaire J, Grolemund G (2018). _R Markdown: The Definitive
##   Guide_. Chapman and Hall/CRC, Boca Raton, Florida. ISBN
##   9781138359338, <https://bookdown.org/yihui/rmarkdown>.
## 
##   Xie Y, Dervieux C, Riederer E (2020). _R Markdown Cookbook_. Chapman
##   and Hall/CRC, Boca Raton, Florida. ISBN 9780367563837,
##   <https://bookdown.org/yihui/rmarkdown-cookbook>.
## 
## To see these entries in BibTeX format, use 'print(<citation>,
## bibtex=TRUE)', 'toBibtex(.)', or set
## 'options(citation.bibtex.max=999)'.
## 
## 
## [[728]]
## 
## To cite package 'rmdformats' in publications use:
## 
##   Barnier J (2022). _rmdformats: HTML Output Formats and Templates for
##   'rmarkdown' Documents_. R package version 1.0.4,
##   <https://CRAN.R-project.org/package=rmdformats>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {rmdformats: HTML Output Formats and Templates for 'rmarkdown' Documents},
##     author = {Julien Barnier},
##     year = {2022},
##     note = {R package version 1.0.4},
##     url = {https://CRAN.R-project.org/package=rmdformats},
##   }
## 
## 
## 
## 
## [[729]]
## 
## To cite package 'rms' in publications use:
## 
##   Harrell Jr FE (2023). _rms: Regression Modeling Strategies_. R
##   package version 6.4-1, <https://CRAN.R-project.org/package=rms>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {rms: Regression Modeling Strategies},
##     author = {Frank E {Harrell Jr}},
##     year = {2023},
##     note = {R package version 6.4-1},
##     url = {https://CRAN.R-project.org/package=rms},
##   }
## 
## ATTENTION: This citation information has been auto-generated from the
## package DESCRIPTION file and may need manual editing, see
## 'help("citation")'.
## 
## 
## 
## 
## [[730]]
## 
## To cite package 'RobStatTM' in publications use:
## 
##   Yohai V, Maronna R, Martin D, Brownson G, Konis K, Salibian-Barrera M
##   (2022). _RobStatTM: Robust Statistics: Theory and Methods_. R package
##   version 1.0.5, <https://CRAN.R-project.org/package=RobStatTM>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {RobStatTM: Robust Statistics: Theory and Methods},
##     author = {Victor Yohai and Ricardo Maronna and Doug Martin and Gregory Brownson and Kjell Konis and Matias Salibian-Barrera},
##     year = {2022},
##     note = {R package version 1.0.5},
##     url = {https://CRAN.R-project.org/package=RobStatTM},
##   }
## 
## 
## 
## 
## [[731]]
## 
## To cite robustbase in publications use:
## 
## To cite package 'robustbase' in publications use:
## 
##   Martin Maechler, Peter Rousseeuw, Christophe Croux, Valentin Todorov,
##   Andreas Ruckstuhl, Matias Salibian-Barrera, Tobias Verbeke, Manuel
##   Koller, c("Eduardo", "L. T.") Conceicao and Maria Anna di Palma
##   (2022). robustbase: Basic Robust Statistics R package version 0.95-0.
##   URL http://CRAN.R-project.org/package=robustbase
## 
## To cite the multivariate class/methods framework use:
## 
##   Valentin Todorov, Peter Filzmoser (2009). An Object-Oriented
##   Framework for Robust Multivariate Analysis. Journal of Statistical
##   Software, 32(3), 1-47. URL
##   https://www.jstatsoft.org/article/view/v032i03/.
## 
## To see these entries in BibTeX format, use 'print(<citation>,
## bibtex=TRUE)', 'toBibtex(.)', or set
## 'options(citation.bibtex.max=999)'.
## 
## 
## [[732]]
## 
## To cite ROCR in publications use:
## 
##   Sing T, Sander O, Beerenwinkel N, Lengauer T (2005). "ROCR:
##   visualizing classifier performance in R." _Bioinformatics_, *21*(20),
##   7881. <http://rocr.bioinf.mpi-sb.mpg.de>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Article{,
##     entry = {article},
##     title = {ROCR: visualizing classifier performance in R},
##     author = {T. Sing and O. Sander and N. Beerenwinkel and T. Lengauer},
##     year = {2005},
##     journal = {Bioinformatics},
##     volume = {21},
##     number = {20},
##     pages = {7881},
##     url = {http://rocr.bioinf.mpi-sb.mpg.de},
##   }
## 
## We have invested a lot of time and effort in creating ROCR, please cite
## it when using it for data analysis.
## 
## 
## [[733]]
## 
## To cite the ROSE package in publications use:
## 
##   Nicola Lunardon, Giovanna Menardi, and Nicola Torelli (2014). ROSE: a
##   Package for Binary Imbalanced Learning. R Journal, 6(1), 82-92.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Article{,
##     title = {{ROSE}: a {P}ackage for {B}inary {I}mbalanced {L}earning},
##     author = {Nicola Lunardon and Giovanna Menardi and Nicola Torelli},
##     journal = {{R} Journal},
##     year = {2014},
##     volume = {6},
##     number = {1},
##     pages = {82--92},
##   }
## 
## 
## [[734]]
## 
## To cite package 'roxygen2' in publications use:
## 
##   Wickham H, Danenberg P, Csárdi G, Eugster M (2022). _roxygen2:
##   In-Line Documentation for R_. R package version 7.2.3,
##   <https://CRAN.R-project.org/package=roxygen2>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {roxygen2: In-Line Documentation for R},
##     author = {Hadley Wickham and Peter Danenberg and Gábor Csárdi and Manuel Eugster},
##     year = {2022},
##     note = {R package version 7.2.3},
##     url = {https://CRAN.R-project.org/package=roxygen2},
##   }
## 
## 
## 
## 
## [[735]]
## 
## To cite package 'rpart' in publications use:
## 
##   Therneau T, Atkinson B (2022). _rpart: Recursive Partitioning and
##   Regression Trees_. R package version 4.1.19,
##   <https://CRAN.R-project.org/package=rpart>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {rpart: Recursive Partitioning and Regression Trees},
##     author = {Terry Therneau and Beth Atkinson},
##     year = {2022},
##     note = {R package version 4.1.19},
##     url = {https://CRAN.R-project.org/package=rpart},
##   }
## 
## 
## 
## 
## [[736]]
## 
## To cite package 'rpart.plot' in publications use:
## 
##   Milborrow S (2022). _rpart.plot: Plot 'rpart' Models: An Enhanced
##   Version of 'plot.rpart'_. R package version 3.1.1,
##   <https://CRAN.R-project.org/package=rpart.plot>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {rpart.plot: Plot 'rpart' Models: An Enhanced Version of 'plot.rpart'},
##     author = {Stephen Milborrow},
##     year = {2022},
##     note = {R package version 3.1.1},
##     url = {https://CRAN.R-project.org/package=rpart.plot},
##   }
## 
## ATTENTION: This citation information has been auto-generated from the
## package DESCRIPTION file and may need manual editing, see
## 'help("citation")'.
## 
## 
## 
## 
## [[737]]
## 
## To cite package 'RPEGLMEN' in publications use:
## 
##   Christidis A, Chen X, Hanson D (2021). _RPEGLMEN: Gamma and
##   Exponential Generalized Linear Models with Elastic Net Penalty_. R
##   package version 1.1.1, <https://CRAN.R-project.org/package=RPEGLMEN>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {RPEGLMEN: Gamma and Exponential Generalized Linear Models with Elastic Net
## Penalty},
##     author = {Anthony Christidis and Xin Chen and Daniel Hanson},
##     year = {2021},
##     note = {R package version 1.1.1},
##     url = {https://CRAN.R-project.org/package=RPEGLMEN},
##   }
## 
## ATTENTION: This citation information has been auto-generated from the
## package DESCRIPTION file and may need manual editing, see
## 'help("citation")'.
## 
## 
## 
## 
## [[738]]
## 
## To cite package 'RPEIF' in publications use:
## 
##   Christidis A, Zhang S, Martin D (2021). _RPEIF: Computation and Plots
##   of Influence Functions for Risk and Performance Measures_. R package
##   version 1.2.4, <https://CRAN.R-project.org/package=RPEIF>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {RPEIF: Computation and Plots of Influence Functions for Risk and
## Performance Measures},
##     author = {Anthony Christidis and Shengyu Zhang and Douglas Martin},
##     year = {2021},
##     note = {R package version 1.2.4},
##     url = {https://CRAN.R-project.org/package=RPEIF},
##   }
## 
## ATTENTION: This citation information has been auto-generated from the
## package DESCRIPTION file and may need manual editing, see
## 'help("citation")'.
## 
## 
## 
## 
## [[739]]
## 
## To cite package 'RPESE' in publications use:
## 
##   Christidis A, Chen X (2022). _RPESE: Estimates of Standard Errors for
##   Risk and Performance Measures_. R package version 1.2.5,
##   <https://CRAN.R-project.org/package=RPESE>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {RPESE: Estimates of Standard Errors for Risk and Performance Measures},
##     author = {Anthony Christidis and Xin Chen},
##     year = {2022},
##     note = {R package version 1.2.5},
##     url = {https://CRAN.R-project.org/package=RPESE},
##   }
## 
## ATTENTION: This citation information has been auto-generated from the
## package DESCRIPTION file and may need manual editing, see
## 'help("citation")'.
## 
## 
## 
## 
## [[740]]
## 
## To cite package 'rprojroot' in publications use:
## 
##   Müller K (2023). _rprojroot: Finding Files in Project
##   Subdirectories_. R package version 2.0.4,
##   <https://CRAN.R-project.org/package=rprojroot>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {rprojroot: Finding Files in Project Subdirectories},
##     author = {Kirill Müller},
##     year = {2023},
##     note = {R package version 2.0.4},
##     url = {https://CRAN.R-project.org/package=rprojroot},
##   }
## 
## 
## 
## 
## [[741]]
## 
## To cite rrcov in publications use:
## 
##   Valentin Todorov, Peter Filzmoser (2009). An Object-Oriented
##   Framework for Robust Multivariate Analysis. Journal of Statistical
##   Software, 32(3), 1-47. DOI: 10.18637/jss.v032.i03.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Article{,
##     title = {An Object-Oriented Framework for Robust Multivariate Analysis},
##     author = {Valentin Todorov and Peter Filzmoser},
##     journal = {Journal of Statistical Software},
##     year = {2009},
##     volume = {32},
##     number = {3},
##     pages = {1--47},
##     doi = {10.18637/jss.v032.i03},
##   }
## 
## 
## [[742]]
## 
## To cite package 'rsample' in publications use:
## 
##   Frick H, Chow F, Kuhn M, Mahoney M, Silge J, Wickham H (2023).
##   _rsample: General Resampling Infrastructure_. R package version
##   1.2.0, <https://CRAN.R-project.org/package=rsample>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {rsample: General Resampling Infrastructure},
##     author = {Hannah Frick and Fanny Chow and Max Kuhn and Michael Mahoney and Julia Silge and Hadley Wickham},
##     year = {2023},
##     note = {R package version 1.2.0},
##     url = {https://CRAN.R-project.org/package=rsample},
##   }
## 
## 
## 
## 
## [[743]]
## 
## To cite package 'rsconnect' in publications use:
## 
##   Atkins A, McPherson J, Allaire J (2023). _rsconnect: Deployment
##   Interface for R Markdown Documents and Shiny Applications_. R package
##   version 0.8.29, <https://CRAN.R-project.org/package=rsconnect>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {rsconnect: Deployment Interface for R Markdown Documents and Shiny
## Applications},
##     author = {Aron Atkins and Jonathan McPherson and JJ Allaire},
##     year = {2023},
##     note = {R package version 0.8.29},
##     url = {https://CRAN.R-project.org/package=rsconnect},
##   }
## 
## 
## 
## 
## [[744]]
## 
## To cite package 'rsq' in publications use:
## 
##   Zhang D (2022). _rsq: R-Squared and Related Measures_. R package
##   version 2.5, <https://CRAN.R-project.org/package=rsq>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {rsq: R-Squared and Related Measures},
##     author = {Dabao Zhang},
##     year = {2022},
##     note = {R package version 2.5},
##     url = {https://CRAN.R-project.org/package=rsq},
##   }
## 
## ATTENTION: This citation information has been auto-generated from the
## package DESCRIPTION file and may need manual editing, see
## 'help("citation")'.
## 
## 
## 
## 
## [[745]]
## 
## To cite package 'rstatix' in publications use:
## 
##   Kassambara A (2022). _rstatix: Pipe-Friendly Framework for Basic
##   Statistical Tests_. R package version 0.7.1,
##   <https://CRAN.R-project.org/package=rstatix>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {rstatix: Pipe-Friendly Framework for Basic Statistical Tests},
##     author = {Alboukadel Kassambara},
##     year = {2022},
##     note = {R package version 0.7.1},
##     url = {https://CRAN.R-project.org/package=rstatix},
##   }
## 
## 
## 
## 
## [[746]]
## 
## To cite package 'rstudioapi' in publications use:
## 
##   Ushey K, Allaire J, Wickham H, Ritchie G (2022). _rstudioapi: Safely
##   Access the RStudio API_. R package version 0.14,
##   <https://CRAN.R-project.org/package=rstudioapi>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {rstudioapi: Safely Access the RStudio API},
##     author = {Kevin Ushey and JJ Allaire and Hadley Wickham and Gary Ritchie},
##     year = {2022},
##     note = {R package version 0.14},
##     url = {https://CRAN.R-project.org/package=rstudioapi},
##   }
## 
## 
## 
## 
## [[747]]
## 
## To cite package 'rversions' in publications use:
## 
##   Csárdi G (2022). _rversions: Query 'R' Versions, Including
##   'r-release' and 'r-oldrel'_. R package version 2.1.2,
##   <https://CRAN.R-project.org/package=rversions>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {rversions: Query 'R' Versions, Including 'r-release' and 'r-oldrel'},
##     author = {Gábor Csárdi},
##     year = {2022},
##     note = {R package version 2.1.2},
##     url = {https://CRAN.R-project.org/package=rversions},
##   }
## 
## 
## 
## 
## [[748]]
## 
## To cite package 'rvest' in publications use:
## 
##   Wickham H (2022). _rvest: Easily Harvest (Scrape) Web Pages_. R
##   package version 1.0.3, <https://CRAN.R-project.org/package=rvest>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {rvest: Easily Harvest (Scrape) Web Pages},
##     author = {Hadley Wickham},
##     year = {2022},
##     note = {R package version 1.0.3},
##     url = {https://CRAN.R-project.org/package=rvest},
##   }
## 
## 
## 
## 
## [[749]]
## 
## To cite package 's2' in publications use:
## 
##   Dunnington D, Pebesma E, Rubak E (2023). _s2: Spherical Geometry
##   Operators Using the S2 Geometry Library_. R package version 1.1.2,
##   <https://CRAN.R-project.org/package=s2>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {s2: Spherical Geometry Operators Using the S2 Geometry Library},
##     author = {Dewey Dunnington and Edzer Pebesma and Ege Rubak},
##     year = {2023},
##     note = {R package version 1.1.2},
##     url = {https://CRAN.R-project.org/package=s2},
##   }
## 
## 
## 
## 
## [[750]]
## 
## To cite sandwich in publications use:
## 
##   Zeileis A, Köll S, Graham N (2020). "Various Versatile Variances: An
##   Object-Oriented Implementation of Clustered Covariances in R."
##   _Journal of Statistical Software_, *95*(1), 1-36.
##   doi:10.18637/jss.v095.i01 <https://doi.org/10.18637/jss.v095.i01>.
## 
## If sandwich is applied to lm() models, please also cite:
## 
##   Zeileis A (2004). "Econometric Computing with HC and HAC Covariance
##   Matrix Estimators." _Journal of Statistical Software_, *11*(10),
##   1-17. doi:10.18637/jss.v011.i10
##   <https://doi.org/10.18637/jss.v011.i10>.
## 
## If sandwich is applied to models other than lm(), please also cite:
## 
##   Zeileis A (2006). "Object-Oriented Computation of Sandwich
##   Estimators." _Journal of Statistical Software_, *16*(9), 1-16.
##   doi:10.18637/jss.v016.i09 <https://doi.org/10.18637/jss.v016.i09>.
## 
## To see these entries in BibTeX format, use 'print(<citation>,
## bibtex=TRUE)', 'toBibtex(.)', or set
## 'options(citation.bibtex.max=999)'.
## 
## 
## [[751]]
## 
## To cite package 'sass' in publications use:
## 
##   Cheng J, Mastny T, Iannone R, Schloerke B, Sievert C (2023). _sass:
##   Syntactically Awesome Style Sheets ('Sass')_. R package version
##   0.4.6, <https://CRAN.R-project.org/package=sass>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {sass: Syntactically Awesome Style Sheets ('Sass')},
##     author = {Joe Cheng and Timothy Mastny and Richard Iannone and Barret Schloerke and Carson Sievert},
##     year = {2023},
##     note = {R package version 0.4.6},
##     url = {https://CRAN.R-project.org/package=sass},
##   }
## 
## 
## 
## 
## [[752]]
## 
## To cite package 'scales' in publications use:
## 
##   Wickham H, Seidel D (2022). _scales: Scale Functions for
##   Visualization_. R package version 1.2.1,
##   <https://CRAN.R-project.org/package=scales>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {scales: Scale Functions for Visualization},
##     author = {Hadley Wickham and Dana Seidel},
##     year = {2022},
##     note = {R package version 1.2.1},
##     url = {https://CRAN.R-project.org/package=scales},
##   }
## 
## 
## 
## 
## [[753]]
## 
## To cite scatterplot3d in publications use:
## 
##   Ligges, U. and Mächler, M. (2003). Scatterplot3d - an R Package for
##   Visualizing Multivariate Data. Journal of Statistical Software 8(11),
##   1-20.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Article{,
##     title = {Scatterplot3d - an R Package for Visualizing Multivariate Data},
##     author = {Uwe Ligges and Martin M{\"a}chler},
##     journal = {Journal of Statistical Software},
##     year = {2003},
##     pages = {1--20},
##     number = {11},
##     volume = {8},
##     doi = {10.18637/jss.v008.i11},
##   }
## 
## 
## [[754]]
## 
## To cite package 'sda' in publications use:
## 
##   Ahdesmaki M, Zuber V, Gibb S, Strimmer K (2021). _sda: Shrinkage
##   Discriminant Analysis and CAT Score Variable Selection_. R package
##   version 1.3.8, <https://CRAN.R-project.org/package=sda>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {sda: Shrinkage Discriminant Analysis and CAT Score Variable Selection},
##     author = {Miika Ahdesmaki and Verena Zuber and Sebastian Gibb and Korbinian Strimmer},
##     year = {2021},
##     note = {R package version 1.3.8},
##     url = {https://CRAN.R-project.org/package=sda},
##   }
## 
## ATTENTION: This citation information has been auto-generated from the
## package DESCRIPTION file and may need manual editing, see
## 'help("citation")'.
## 
## 
## 
## 
## [[755]]
## 
## To cite package 'selectr' in publications use:
## 
##   Potter S (2012). "Introducing the selectr Package." The University of
##   Auckland, Auckland, New Zealand.
##   <http://stattech.wordpress.fos.auckland.ac.nz/2012-10-introducing-the-selectr-package/>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @TechReport{,
##     title = {Introducing the selectr Package},
##     author = {Simon Potter},
##     institution = {The University of Auckland},
##     address = {Auckland, New Zealand},
##     year = {2012},
##     url = {http://stattech.wordpress.fos.auckland.ac.nz/2012-10-introducing-the-selectr-package/},
##   }
## 
## 
## [[756]]
## 
## To cite package 'sessioninfo' in publications use:
## 
##   Wickham H, Chang W, Flight R, Müller K, Hester J (2021).
##   _sessioninfo: R Session Information_. R package version 1.2.2,
##   <https://CRAN.R-project.org/package=sessioninfo>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {sessioninfo: R Session Information},
##     author = {Hadley Wickham and Winston Chang and Robert Flight and Kirill Müller and Jim Hester},
##     year = {2021},
##     note = {R package version 1.2.2},
##     url = {https://CRAN.R-project.org/package=sessioninfo},
##   }
## 
## 
## 
## 
## [[757]]
## 
## To cite package sf in publications, please use:
## 
##   Pebesma, E., 2018. Simple Features for R: Standardized Support for
##   Spatial Vector Data. The R Journal 10 (1), 439-446,
##   https://doi.org/10.32614/RJ-2018-009
## 
##   Pebesma, E., & Bivand, R. (2023). Spatial Data Science: With
##   Applications in R (1st ed.). Chapman and Hall/CRC.
##   https://doi.org/10.1201/9780429459016
## 
## To see these entries in BibTeX format, use 'print(<citation>,
## bibtex=TRUE)', 'toBibtex(.)', or set
## 'options(citation.bibtex.max=999)'.
## 
## 
## [[758]]
## 
## To cite package 'sftime' in publications use:
## 
##   Teickner H, Pebesma E, Graeler B (2022). _sftime: Classes and Methods
##   for Simple Feature Objects that Have a Time Column_. R package
##   version 0.2-0, <https://CRAN.R-project.org/package=sftime>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {sftime: Classes and Methods for Simple Feature Objects that Have a Time
## Column},
##     author = {Henning Teickner and Edzer Pebesma and Benedikt Graeler},
##     year = {2022},
##     note = {R package version 0.2-0},
##     url = {https://CRAN.R-project.org/package=sftime},
##   }
## 
## 
## 
## 
## [[759]]
## 
## To cite package 'shape' in publications use:
## 
##   Soetaert K (2021). _shape: Functions for Plotting Graphical Shapes,
##   Colors_. R package version 1.4.6,
##   <https://CRAN.R-project.org/package=shape>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {shape: Functions for Plotting Graphical Shapes, Colors},
##     author = {Karline Soetaert},
##     year = {2021},
##     note = {R package version 1.4.6},
##     url = {https://CRAN.R-project.org/package=shape},
##   }
## 
## ATTENTION: This citation information has been auto-generated from the
## package DESCRIPTION file and may need manual editing, see
## 'help("citation")'.
## 
## 
## 
## 
## [[760]]
## 
## To cite package 'shiny' in publications use:
## 
##   Chang W, Cheng J, Allaire J, Sievert C, Schloerke B, Xie Y, Allen J,
##   McPherson J, Dipert A, Borges B (2022). _shiny: Web Application
##   Framework for R_. R package version 1.7.4,
##   <https://CRAN.R-project.org/package=shiny>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {shiny: Web Application Framework for R},
##     author = {Winston Chang and Joe Cheng and JJ Allaire and Carson Sievert and Barret Schloerke and Yihui Xie and Jeff Allen and Jonathan McPherson and Alan Dipert and Barbara Borges},
##     year = {2022},
##     note = {R package version 1.7.4},
##     url = {https://CRAN.R-project.org/package=shiny},
##   }
## 
## 
## 
## 
## [[761]]
## 
## To cite package 'shinybusy' in publications use:
## 
##   Meyer F, Perrier V (2022). _shinybusy: Busy Indicators and
##   Notifications for 'Shiny' Applications_. R package version 0.3.1,
##   <https://CRAN.R-project.org/package=shinybusy>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {shinybusy: Busy Indicators and Notifications for 'Shiny' Applications},
##     author = {Fanny Meyer and Victor Perrier},
##     year = {2022},
##     note = {R package version 0.3.1},
##     url = {https://CRAN.R-project.org/package=shinybusy},
##   }
## 
## 
## 
## 
## [[762]]
## 
## To cite package 'shinydashboard' in publications use:
## 
##   Chang W, Borges Ribeiro B (2021). _shinydashboard: Create Dashboards
##   with 'Shiny'_. R package version 0.7.2,
##   <https://CRAN.R-project.org/package=shinydashboard>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {shinydashboard: Create Dashboards with 'Shiny'},
##     author = {Winston Chang and Barbara {Borges Ribeiro}},
##     year = {2021},
##     note = {R package version 0.7.2},
##     url = {https://CRAN.R-project.org/package=shinydashboard},
##   }
## 
## 
## 
## 
## [[763]]
## 
## To cite package 'shinyjs' in publications use:
## 
##   Attali D (2021). _shinyjs: Easily Improve the User Experience of Your
##   Shiny Apps in Seconds_. R package version 2.1.0,
##   <https://CRAN.R-project.org/package=shinyjs>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {shinyjs: Easily Improve the User Experience of Your Shiny Apps in Seconds},
##     author = {Dean Attali},
##     year = {2021},
##     note = {R package version 2.1.0},
##     url = {https://CRAN.R-project.org/package=shinyjs},
##   }
## 
## 
## 
## 
## [[764]]
## 
## To cite package 'shinyWidgets' in publications use:
## 
##   Perrier V, Meyer F, Granjon D (2023). _shinyWidgets: Custom Inputs
##   Widgets for Shiny_. R package version 0.7.6,
##   <https://CRAN.R-project.org/package=shinyWidgets>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {shinyWidgets: Custom Inputs Widgets for Shiny},
##     author = {Victor Perrier and Fanny Meyer and David Granjon},
##     year = {2023},
##     note = {R package version 0.7.6},
##     url = {https://CRAN.R-project.org/package=shinyWidgets},
##   }
## 
## 
## 
## 
## [[765]]
## 
## To cite package 'sjlabelled' in publications use:
## 
##   Lüdecke D (2022). _sjlabelled: Labelled Data Utility Functions
##   (Version 1.2.0)_. doi:10.5281/zenodo.1249215
##   <https://doi.org/10.5281/zenodo.1249215>,
##   <https://CRAN.R-project.org/package=sjlabelled>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {sjlabelled: Labelled Data Utility Functions (Version 1.2.0)},
##     author = {Daniel Lüdecke},
##     year = {2022},
##     url = {https://CRAN.R-project.org/package=sjlabelled},
##     doi = {10.5281/zenodo.1249215},
##   }
## 
## 
## [[766]]
## 
## To cite package 'skimr' in publications use:
## 
##   Waring E, Quinn M, McNamara A, Arino de la Rubia E, Zhu H, Ellis S
##   (2022). _skimr: Compact and Flexible Summaries of Data_. R package
##   version 2.1.5, <https://CRAN.R-project.org/package=skimr>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {skimr: Compact and Flexible Summaries of Data},
##     author = {Elin Waring and Michael Quinn and Amelia McNamara and Eduardo {Arino de la Rubia} and Hao Zhu and Shannon Ellis},
##     year = {2022},
##     note = {R package version 2.1.5},
##     url = {https://CRAN.R-project.org/package=skimr},
##   }
## 
## 
## 
## 
## [[767]]
## 
## To cite package 'slam' in publications use:
## 
##   Hornik K, Meyer D, Buchta C (2022). _slam: Sparse Lightweight Arrays
##   and Matrices_. R package version 0.1-50,
##   <https://CRAN.R-project.org/package=slam>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {slam: Sparse Lightweight Arrays and Matrices},
##     author = {Kurt Hornik and David Meyer and Christian Buchta},
##     year = {2022},
##     note = {R package version 0.1-50},
##     url = {https://CRAN.R-project.org/package=slam},
##   }
## 
## 
## 
## 
## [[768]]
## 
## To cite package 'slider' in publications use:
## 
##   Vaughan D (2022). _slider: Sliding Window Functions_. R package
##   version 0.3.0, <https://CRAN.R-project.org/package=slider>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {slider: Sliding Window Functions},
##     author = {Davis Vaughan},
##     year = {2022},
##     note = {R package version 0.3.0},
##     url = {https://CRAN.R-project.org/package=slider},
##   }
## 
## 
## 
## 
## [[769]]
## 
## To cite SMOTEWB in publications use:
## 
##   Sağlam, F., & Cengiz, M. A. (2022). A novel SMOTE-based resampling
##   technique trough noise detection and the boosting procedure. Expert
##   Systems with Applications, 200, 117023,
##   https://doi.org/10.1016/j.eswa.2022.117023
## 
## A BibTeX entry for LaTeX users is
## 
##   @Article{,
##     title = {A novel SMOTE-based resampling technique trough noise detection and the boosting procedure},
##     author = {{Sağlam} and {Fatih} and {Cengiz} and Mehmet Ali},
##     journal = {Expert Systems with Applications},
##     month = {8},
##     year = {2022},
##     volume = {200},
##     pages = {117023},
##     url = {https://www.sciencedirect.com/science/article/pii/S0957417422004407},
##     doi = {10.1016/j.eswa.2022.117023},
##   }
## 
## 
## [[770]]
## 
## To cite package 'snakecase' in publications use:
## 
##   Grosser M (2019). _snakecase: Convert Strings into any Case_. R
##   package version 0.11.0,
##   <https://CRAN.R-project.org/package=snakecase>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {snakecase: Convert Strings into any Case},
##     author = {Malte Grosser},
##     year = {2019},
##     note = {R package version 0.11.0},
##     url = {https://CRAN.R-project.org/package=snakecase},
##   }
## 
## 
## 
## 
## [[771]]
## 
## To cite package 'sourcetools' in publications use:
## 
##   Ushey K (2023). _sourcetools: Tools for Reading, Tokenizing and
##   Parsing R Code_. R package version 0.1.7-1,
##   <https://CRAN.R-project.org/package=sourcetools>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {sourcetools: Tools for Reading, Tokenizing and Parsing R Code},
##     author = {Kevin Ushey},
##     year = {2023},
##     note = {R package version 0.1.7-1},
##     url = {https://CRAN.R-project.org/package=sourcetools},
##   }
## 
## ATTENTION: This citation information has been auto-generated from the
## package DESCRIPTION file and may need manual editing, see
## 'help("citation")'.
## 
## 
## 
## 
## [[772]]
## 
## To cite package sp in publications use:
## 
##   Pebesma, E.J., R.S. Bivand, 2005. Classes and methods for spatial
##   data in R. R News 5 (2), https://cran.r-project.org/doc/Rnews/.
## 
##   Roger S. Bivand, Edzer Pebesma, Virgilio Gomez-Rubio, 2013. Applied
##   spatial data analysis with R, Second edition. Springer, NY.
##   https://asdar-book.org/
## 
## To see these entries in BibTeX format, use 'print(<citation>,
## bibtex=TRUE)', 'toBibtex(.)', or set
## 'options(citation.bibtex.max=999)'.
## 
## 
## [[773]]
## 
## To cite spacetime in publications use:
## 
##   Edzer Pebesma (2012). spacetime: Spatio-Temporal Data in R. Journal
##   of Statistical Software, 51(7), 1-30. URL
##   https://www.jstatsoft.org/v51/i07/.
## 
##   Roger S. Bivand, Edzer Pebesma, Virgilio Gomez-Rubio, 2013. Applied
##   spatial data analysis with R, Second edition. Springer, NY.
##   https://asdar-book.org/
## 
## To see these entries in BibTeX format, use 'print(<citation>,
## bibtex=TRUE)', 'toBibtex(.)', or set
## 'options(citation.bibtex.max=999)'.
## 
## 
## [[774]]
## 
## To cite package 'SparseM' in publications use:
## 
##   Koenker R (2021). _SparseM: Sparse Linear Algebra_. R package version
##   1.81, <https://CRAN.R-project.org/package=SparseM>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {SparseM: Sparse Linear Algebra},
##     author = {Roger Koenker},
##     year = {2021},
##     note = {R package version 1.81},
##     url = {https://CRAN.R-project.org/package=SparseM},
##   }
## 
## 
## 
## 
## [[775]]
## 
## To cite the spatial package in publications use:
## 
##   Venables, W. N. & Ripley, B. D. (2002) Modern Applied Statistics with
##   S. Fourth Edition. Springer, New York. ISBN 0-387-95457-0
## 
## A BibTeX entry for LaTeX users is
## 
##   @Book{,
##     title = {Modern Applied Statistics with S},
##     author = {W. N. Venables and B. D. Ripley},
##     publisher = {Springer},
##     edition = {Fourth},
##     address = {New York},
##     year = {2002},
##     note = {ISBN 0-387-95457-0},
##     url = {https://www.stats.ox.ac.uk/pub/MASS4/},
##   }
## 
## 
## [[776]]
## 
## The 'splines' package is part of R.  To cite R in publications use:
## 
##   R Core Team (2022). R: A language and environment for statistical
##   computing. R Foundation for Statistical Computing, Vienna, Austria.
##   URL https://www.R-project.org/.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {R: A Language and Environment for Statistical Computing},
##     author = {{R Core Team}},
##     organization = {R Foundation for Statistical Computing},
##     address = {Vienna, Austria},
##     year = {2022},
##     url = {https://www.R-project.org/},
##   }
## 
## We have invested a lot of time and effort in creating R, please cite it
## when using it for data analysis. See also 'citation("pkgname")' for
## citing R packages.
## 
## 
## [[777]]
## 
## To cite package 'spls' in publications use:
## 
##   Chung D, Chun H, Keles S (2019). _spls: Sparse Partial Least Squares
##   (SPLS) Regression and Classification_. R package version 2.2-3,
##   <https://CRAN.R-project.org/package=spls>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {spls: Sparse Partial Least Squares (SPLS) Regression and
## Classification},
##     author = {Dongjun Chung and Hyonho Chun and Sunduz Keles},
##     year = {2019},
##     note = {R package version 2.2-3},
##     url = {https://CRAN.R-project.org/package=spls},
##   }
## 
## ATTENTION: This citation information has been auto-generated from the
## package DESCRIPTION file and may need manual editing, see
## 'help("citation")'.
## 
## 
## 
## 
## [[778]]
## 
## To cite SQUAREM in publications use:
## 
##   Du Y, Varadhan R (2020). "SQUAREM: An R Package for Off-the-Shelf
##   Acceleration of EM, MM and Other EM-Like Monotone Algorithms."
##   _Journal of Statistical Software_, *92*(7), 1-41.
##   doi:10.18637/jss.v092.i07 <https://doi.org/10.18637/jss.v092.i07>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Article{,
##     title = {{SQUAREM}: An {R} Package for Off-the-Shelf Acceleration of {EM}, {MM} and Other {EM}-Like Monotone Algorithms},
##     author = {Yu Du and Ravi Varadhan},
##     journal = {Journal of Statistical Software},
##     year = {2020},
##     volume = {92},
##     number = {7},
##     pages = {1--41},
##     doi = {10.18637/jss.v092.i07},
##   }
## 
## 
## 
## 
## [[779]]
## 
## To cite package 'st' in publications use:
## 
##   Opgen-Rhein R, Zuber V, Strimmer. K (2021). _st: Shrinkage t
##   Statistic and Correlation-Adjusted t-Score_. R package version 1.2.7,
##   <https://CRAN.R-project.org/package=st>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {st: Shrinkage t Statistic and Correlation-Adjusted t-Score},
##     author = {Rainer Opgen-Rhein and Verena Zuber and Korbinian Strimmer.},
##     year = {2021},
##     note = {R package version 1.2.7},
##     url = {https://CRAN.R-project.org/package=st},
##   }
## 
## ATTENTION: This citation information has been auto-generated from the
## package DESCRIPTION file and may need manual editing, see
## 'help("citation")'.
## 
## 
## 
## 
## [[780]]
## 
## Please cite stargazer in publications as:
## 
##   Hlavac, Marek (2022). stargazer: Well-Formatted Regression and
##   Summary Statistics Tables. R package version 5.2.3.
##   https://CRAN.R-project.org/package=stargazer
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {stargazer: Well-Formatted Regression and Summary Statistics Tables},
##     author = {Marek Hlavac},
##     year = {2022},
##     note = {R package version 5.2.3},
##     organization = {Social Policy Institute},
##     address = {Bratislava, Slovakia},
##     url = {https://CRAN.R-project.org/package=stargazer},
##   }
## 
## 
## [[781]]
## 
## To cite package 'stars' in publications use:
## 
##   Pebesma E (2022). _stars: Spatiotemporal Arrays, Raster and Vector
##   Data Cubes_. R package version 0.6-0,
##   <https://CRAN.R-project.org/package=stars>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {stars: Spatiotemporal Arrays, Raster and Vector Data Cubes},
##     author = {Edzer Pebesma},
##     year = {2022},
##     note = {R package version 0.6-0},
##     url = {https://CRAN.R-project.org/package=stars},
##   }
## 
## 
## 
## 
## [[782]]
## 
## The 'stats' package is part of R.  To cite R in publications use:
## 
##   R Core Team (2022). R: A language and environment for statistical
##   computing. R Foundation for Statistical Computing, Vienna, Austria.
##   URL https://www.R-project.org/.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {R: A Language and Environment for Statistical Computing},
##     author = {{R Core Team}},
##     organization = {R Foundation for Statistical Computing},
##     address = {Vienna, Austria},
##     year = {2022},
##     url = {https://www.R-project.org/},
##   }
## 
## We have invested a lot of time and effort in creating R, please cite it
## when using it for data analysis. See also 'citation("pkgname")' for
## citing R packages.
## 
## 
## [[783]]
## 
## The 'stats4' package is part of R.  To cite R in publications use:
## 
##   R Core Team (2022). R: A language and environment for statistical
##   computing. R Foundation for Statistical Computing, Vienna, Austria.
##   URL https://www.R-project.org/.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {R: A Language and Environment for Statistical Computing},
##     author = {{R Core Team}},
##     organization = {R Foundation for Statistical Computing},
##     address = {Vienna, Austria},
##     year = {2022},
##     url = {https://www.R-project.org/},
##   }
## 
## We have invested a lot of time and effort in creating R, please cite it
## when using it for data analysis. See also 'citation("pkgname")' for
## citing R packages.
## 
## 
## [[784]]
## 
## To cite stringi in publications, use:
## 
##   Gagolewski M (2022). "stringi: Fast and portable character string
##   processing in R." _Journal of Statistical Software_, *103*(2), 1-59.
##   doi:10.18637/jss.v103.i02 <https://doi.org/10.18637/jss.v103.i02>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Article{,
##     title = {{stringi}: {F}ast and portable character string processing in {R}},
##     author = {Marek Gagolewski},
##     journal = {Journal of Statistical Software},
##     year = {2022},
##     volume = {103},
##     number = {2},
##     pages = {1--59},
##     doi = {10.18637/jss.v103.i02},
##   }
## 
## 
## 
## 
## [[785]]
## 
## To cite package 'stringr' in publications use:
## 
##   Wickham H (2023). _stringr: Simple, Consistent Wrappers for Common
##   String Operations_. R package version 1.5.1,
##   <https://CRAN.R-project.org/package=stringr>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {stringr: Simple, Consistent Wrappers for Common String Operations},
##     author = {Hadley Wickham},
##     year = {2023},
##     note = {R package version 1.5.1},
##     url = {https://CRAN.R-project.org/package=stringr},
##   }
## 
## 
## 
## 
## [[786]]
## 
## To cite strucchange in publications use:
## 
##   Zeileis A, Leisch F, Hornik K, Kleiber C (2002). "strucchange: An R
##   Package for Testing for Structural Change in Linear Regression
##   Models." _Journal of Statistical Software_, *7*(2), 1-38.
##   doi:10.18637/jss.v007.i02 <https://doi.org/10.18637/jss.v007.i02>.
## 
## If methods related to breakpoints() are used also cite:
## 
##   Zeileis A, Kleiber C, Krämer W, Hornik K (2003). "Testing and Dating
##   of Structural Changes in Practice." _Computational Statistics \& Data
##   Analysis_, *44*(1-2), 109-123. doi:10.1016/S0167-9473(03)00030-6
##   <https://doi.org/10.1016/S0167-9473%2803%2900030-6>.
## 
## If methods related to gefp() and efpFunctional() are used also cite:
## 
##   Zeileis A (2006). "Implementing a Class of Structural Change Tests:
##   An Econometric Computing Approach." _Computational Statistics \& Data
##   Analysis_, *50*(11), 2987-3008. doi:10.1016/j.csda.2005.07.001
##   <https://doi.org/10.1016/j.csda.2005.07.001>.
## 
## To see these entries in BibTeX format, use 'print(<citation>,
## bibtex=TRUE)', 'toBibtex(.)', or set
## 'options(citation.bibtex.max=999)'.
## 
## 
## [[787]]
## 
## To cite package 'styler' in publications use:
## 
##   Müller K, Walthert L (2023). _styler: Non-Invasive Pretty Printing of
##   R Code_. R package version 1.9.0,
##   <https://CRAN.R-project.org/package=styler>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {styler: Non-Invasive Pretty Printing of R Code},
##     author = {Kirill Müller and Lorenz Walthert},
##     year = {2023},
##     note = {R package version 1.9.0},
##     url = {https://CRAN.R-project.org/package=styler},
##   }
## 
## 
## 
## 
## [[788]]
## 
## To cite package 'subselect' in publications use:
## 
##   Orestes Cerdeira J, Duarte Silva P, Cadima J, Minhoto M (2023).
##   _subselect: Selecting Variable Subsets_. R package version 0.15.4,
##   <https://CRAN.R-project.org/package=subselect>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {subselect: Selecting Variable Subsets},
##     author = {Jorge {Orestes Cerdeira} and Pedro {Duarte Silva} and Jorge Cadima and Manuel Minhoto},
##     year = {2023},
##     note = {R package version 0.15.4},
##     url = {https://CRAN.R-project.org/package=subselect},
##   }
## 
## 
## 
## 
## [[789]]
## 
## To cite superpc in publications use:
## 
##   Bair E. and Tibshirani R. (2004).  Semi-supervised methods to predict
##   patient survival from gene expression data.  PLoS Biol.
##   2004;2(4):e108.
## 
##   Bair E., Hastie T., Paul D., and Tibshirani R. (2006).  Prediction by
##   supervised principal components.  J. Am. Stat. Assoc.
##   2006;101(473):119-137.
## 
## To see these entries in BibTeX format, use 'print(<citation>,
## bibtex=TRUE)', 'toBibtex(.)', or set
## 'options(citation.bibtex.max=999)'.
## 
## 
## [[790]]
## 
## To cite the survey package in publications use one or more of:
## 
##   T. Lumley (2020) "survey: analysis of complex survey samples". R
##   package version 4.0.
## 
##   T. Lumley (2004) Analysis of complex survey samples. Journal of
##   Statistical Software 9(1): 1-19
## 
##   T. Lumley (2010) Complex Surveys: A Guide to Analysis Using R. John
##   Wiley and Sons.
## 
## To see these entries in BibTeX format, use 'print(<citation>,
## bibtex=TRUE)', 'toBibtex(.)', or set
## 'options(citation.bibtex.max=999)'.
## 
## 
## [[791]]
## 
## To cite package 'survival' in publications use:
## 
##   Therneau T (2023). _A Package for Survival Analysis in R_. R package
##   version 3.5-0, <https://CRAN.R-project.org/package=survival>.
## 
##   Terry M. Therneau, Patricia M. Grambsch (2000). _Modeling Survival
##   Data: Extending the Cox Model_. Springer, New York. ISBN
##   0-387-98784-3.
## 
## To see these entries in BibTeX format, use 'print(<citation>,
## bibtex=TRUE)', 'toBibtex(.)', or set
## 'options(citation.bibtex.max=999)'.
## 
## 
## [[792]]
## 
## To cite package 'svglite' in publications use:
## 
##   Wickham H, Henry L, Pedersen T, Luciani T, Decorde M, Lise V (2023).
##   _svglite: An 'SVG' Graphics Device_. R package version 2.1.1,
##   <https://CRAN.R-project.org/package=svglite>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {svglite: An 'SVG' Graphics Device},
##     author = {Hadley Wickham and Lionel Henry and Thomas Lin Pedersen and T Jake Luciani and Matthieu Decorde and Vaudor Lise},
##     year = {2023},
##     note = {R package version 2.1.1},
##     url = {https://CRAN.R-project.org/package=svglite},
##   }
## 
## 
## 
## 
## [[793]]
## 
## To cite package 'sys' in publications use:
## 
##   Ooms J (2023). _sys: Powerful and Reliable Tools for Running System
##   Commands in R_. R package version 3.4.2,
##   <https://CRAN.R-project.org/package=sys>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {sys: Powerful and Reliable Tools for Running System Commands in R},
##     author = {Jeroen Ooms},
##     year = {2023},
##     note = {R package version 3.4.2},
##     url = {https://CRAN.R-project.org/package=sys},
##   }
## 
## 
## 
## 
## [[794]]
## 
## To cite package 'systemfonts' in publications use:
## 
##   Pedersen T, Ooms J, Govett D (2022). _systemfonts: System Native Font
##   Finding_. R package version 1.0.4,
##   <https://CRAN.R-project.org/package=systemfonts>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {systemfonts: System Native Font Finding},
##     author = {Thomas Lin Pedersen and Jeroen Ooms and Devon Govett},
##     year = {2022},
##     note = {R package version 1.0.4},
##     url = {https://CRAN.R-project.org/package=systemfonts},
##   }
## 
## 
## 
## 
## [[795]]
## 
## To cite package 'tables' in publications use:
## 
##   Murdoch D (2022). _tables: Formula-Driven Table Generation_. R
##   package version 0.9.10, <https://CRAN.R-project.org/package=tables>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {tables: Formula-Driven Table Generation},
##     author = {Duncan Murdoch},
##     year = {2022},
##     note = {R package version 0.9.10},
##     url = {https://CRAN.R-project.org/package=tables},
##   }
## 
## ATTENTION: This citation information has been auto-generated from the
## package DESCRIPTION file and may need manual editing, see
## 'help("citation")'.
## 
## 
## 
## 
## [[796]]
## 
## The 'tcltk' package is part of R.  To cite R in publications use:
## 
##   R Core Team (2022). R: A language and environment for statistical
##   computing. R Foundation for Statistical Computing, Vienna, Austria.
##   URL https://www.R-project.org/.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {R: A Language and Environment for Statistical Computing},
##     author = {{R Core Team}},
##     organization = {R Foundation for Statistical Computing},
##     address = {Vienna, Austria},
##     year = {2022},
##     url = {https://www.R-project.org/},
##   }
## 
## We have invested a lot of time and effort in creating R, please cite it
## when using it for data analysis. See also 'citation("pkgname")' for
## citing R packages.
## 
## 
## [[797]]
## 
## To cite package 'TeachingDemos' in publications use:
## 
##   Snow G (2020). _TeachingDemos: Demonstrations for Teaching and
##   Learning_. R package version 2.12,
##   <https://CRAN.R-project.org/package=TeachingDemos>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {TeachingDemos: Demonstrations for Teaching and Learning},
##     author = {Greg Snow},
##     year = {2020},
##     note = {R package version 2.12},
##     url = {https://CRAN.R-project.org/package=TeachingDemos},
##   }
## 
## ATTENTION: This citation information has been auto-generated from the
## package DESCRIPTION file and may need manual editing, see
## 'help("citation")'.
## 
## 
## 
## 
## [[798]]
## 
## To cite package 'terra' in publications use:
## 
##   Hijmans R (2023). _terra: Spatial Data Analysis_. R package version
##   1.7-3, <https://CRAN.R-project.org/package=terra>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {terra: Spatial Data Analysis},
##     author = {Robert J. Hijmans},
##     year = {2023},
##     note = {R package version 1.7-3},
##     url = {https://CRAN.R-project.org/package=terra},
##   }
## 
## 
## 
## 
## [[799]]
## 
## To cite package 'testthat' in publications use:
## 
##   Wickham H (2011). "testthat: Get Started with Testing." _The R
##   Journal_, *3*, 5-10.
##   <https://journal.r-project.org/archive/2011-1/RJournal_2011-1_Wickham.pdf>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Article{,
##     author = {Hadley Wickham},
##     title = {testthat: Get Started with Testing},
##     journal = {The R Journal},
##     year = {2011},
##     volume = {3},
##     pages = {5--10},
##     url = {https://journal.r-project.org/archive/2011-1/RJournal_2011-1_Wickham.pdf},
##   }
## 
## 
## [[800]]
## 
## To cite texreg in publications use:
## 
##   Leifeld, Philip (2013). texreg: Conversion of Statistical Model
##   Output in R to LaTeX and HTML Tables. Journal of Statistical
##   Software, 55(8), 1-24. URL http://dx.doi.org/10.18637/jss.v055.i08.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Article{,
##     title = {{texreg}: Conversion of Statistical Model Output in {R} to {\LaTeX} and {HTML} Tables},
##     author = {Philip Leifeld},
##     journal = {Journal of Statistical Software},
##     year = {2013},
##     volume = {55},
##     number = {8},
##     pages = {1--24},
##     url = {http://dx.doi.org/10.18637/jss.v055.i08},
##   }
## 
## 
## [[801]]
## 
## To cite package 'textshaping' in publications use:
## 
##   Pedersen T (2021). _textshaping: Bindings to the 'HarfBuzz' and
##   'Fribidi' Libraries for Text Shaping_. R package version 0.3.6,
##   <https://CRAN.R-project.org/package=textshaping>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {textshaping: Bindings to the 'HarfBuzz' and 'Fribidi' Libraries for Text
## Shaping},
##     author = {Thomas Lin Pedersen},
##     year = {2021},
##     note = {R package version 0.3.6},
##     url = {https://CRAN.R-project.org/package=textshaping},
##   }
## 
## 
## 
## 
## [[802]]
## 
## To cite package 'TH.data' in publications use:
## 
##   Hothorn T (2022). _TH.data: TH's Data Archive_. R package version
##   1.1-1, <https://CRAN.R-project.org/package=TH.data>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {TH.data: TH's Data Archive},
##     author = {Torsten Hothorn},
##     year = {2022},
##     note = {R package version 1.1-1},
##     url = {https://CRAN.R-project.org/package=TH.data},
##   }
## 
## 
## 
## 
## [[803]]
## 
## To cite package 'themis' in publications use:
## 
##   Hvitfeldt E (2022). _themis: Extra Recipes Steps for Dealing with
##   Unbalanced Data_. R package version 1.0.0,
##   <https://CRAN.R-project.org/package=themis>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {themis: Extra Recipes Steps for Dealing with Unbalanced Data},
##     author = {Emil Hvitfeldt},
##     year = {2022},
##     note = {R package version 1.0.0},
##     url = {https://CRAN.R-project.org/package=themis},
##   }
## 
## 
## 
## 
## [[804]]
## 
## To cite package 'this.path' in publications use:
## 
##   Simmons A (2023). _this.path: Get Executing Script's Path, from
##   'Rgui', 'RStudio', 'VSCode', 'source()', and 'Rscript' (Shells
##   Including Windows Command Line / / Unix Terminal)_. R package version
##   1.2.0, <https://CRAN.R-project.org/package=this.path>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {this.path: Get Executing Script's Path, from 'Rgui', 'RStudio', 'VSCode',
## 'source()', and 'Rscript' (Shells Including Windows Command
## Line / / Unix Terminal)},
##     author = {Andrew Simmons},
##     year = {2023},
##     note = {R package version 1.2.0},
##     url = {https://CRAN.R-project.org/package=this.path},
##   }
## 
## ATTENTION: This citation information has been auto-generated from the
## package DESCRIPTION file and may need manual editing, see
## 'help("citation")'.
## 
## 
## 
## 
## [[805]]
## 
## To cite package 'tibble' in publications use:
## 
##   Müller K, Wickham H (2023). _tibble: Simple Data Frames_. R package
##   version 3.2.1, <https://CRAN.R-project.org/package=tibble>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {tibble: Simple Data Frames},
##     author = {Kirill Müller and Hadley Wickham},
##     year = {2023},
##     note = {R package version 3.2.1},
##     url = {https://CRAN.R-project.org/package=tibble},
##   }
## 
## 
## 
## 
## [[806]]
## 
## To cite package 'tidymodels' in publications use:
## 
##   Kuhn et al., (2020). Tidymodels: a collection of packages for
##   modeling and machine learning using tidyverse principles.
##   https://www.tidymodels.org
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {Tidymodels: a collection of packages for modeling and machine learning using tidyverse principles.},
##     author = {Max Kuhn and Hadley Wickham},
##     url = {https://www.tidymodels.org},
##     year = {2020},
##   }
## 
## 
## [[807]]
## 
## To cite package 'tidyr' in publications use:
## 
##   Wickham H, Vaughan D, Girlich M (2023). _tidyr: Tidy Messy Data_. R
##   package version 1.3.0, <https://CRAN.R-project.org/package=tidyr>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {tidyr: Tidy Messy Data},
##     author = {Hadley Wickham and Davis Vaughan and Maximilian Girlich},
##     year = {2023},
##     note = {R package version 1.3.0},
##     url = {https://CRAN.R-project.org/package=tidyr},
##   }
## 
## 
## 
## 
## [[808]]
## 
## To cite package 'tidyselect' in publications use:
## 
##   Henry L, Wickham H (2022). _tidyselect: Select from a Set of
##   Strings_. R package version 1.2.0,
##   <https://CRAN.R-project.org/package=tidyselect>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {tidyselect: Select from a Set of Strings},
##     author = {Lionel Henry and Hadley Wickham},
##     year = {2022},
##     note = {R package version 1.2.0},
##     url = {https://CRAN.R-project.org/package=tidyselect},
##   }
## 
## 
## 
## 
## [[809]]
## 
## To cite package 'tidyverse' in publications use:
## 
##   Wickham H, Averick M, Bryan J, Chang W, McGowan LD, François R,
##   Grolemund G, Hayes A, Henry L, Hester J, Kuhn M, Pedersen TL, Miller
##   E, Bache SM, Müller K, Ooms J, Robinson D, Seidel DP, Spinu V,
##   Takahashi K, Vaughan D, Wilke C, Woo K, Yutani H (2019). "Welcome to
##   the tidyverse." _Journal of Open Source Software_, *4*(43), 1686.
##   doi:10.21105/joss.01686 <https://doi.org/10.21105/joss.01686>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Article{,
##     title = {Welcome to the {tidyverse}},
##     author = {Hadley Wickham and Mara Averick and Jennifer Bryan and Winston Chang and Lucy D'Agostino McGowan and Romain François and Garrett Grolemund and Alex Hayes and Lionel Henry and Jim Hester and Max Kuhn and Thomas Lin Pedersen and Evan Miller and Stephan Milton Bache and Kirill Müller and Jeroen Ooms and David Robinson and Dana Paige Seidel and Vitalie Spinu and Kohske Takahashi and Davis Vaughan and Claus Wilke and Kara Woo and Hiroaki Yutani},
##     year = {2019},
##     journal = {Journal of Open Source Software},
##     volume = {4},
##     number = {43},
##     pages = {1686},
##     doi = {10.21105/joss.01686},
##   }
## 
## 
## [[810]]
## 
## To cite package 'timechange' in publications use:
## 
##   Spinu V (2023). _timechange: Efficient Manipulation of Date-Times_. R
##   package version 0.2.0,
##   <https://CRAN.R-project.org/package=timechange>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {timechange: Efficient Manipulation of Date-Times},
##     author = {Vitalie Spinu},
##     year = {2023},
##     note = {R package version 0.2.0},
##     url = {https://CRAN.R-project.org/package=timechange},
##   }
## 
## 
## 
## 
## [[811]]
## 
## To cite package 'timeDate' in publications use:
## 
##   Wuertz D, Setz T, Chalabi Y, Boshnakov GN (2023). _timeDate: Rmetrics
##   - Chronological and Calendar Objects_. R package version 4022.108,
##   <https://CRAN.R-project.org/package=timeDate>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {timeDate: Rmetrics - Chronological and Calendar Objects},
##     author = {Diethelm Wuertz and Tobias Setz and Yohan Chalabi and Georgi N. Boshnakov},
##     year = {2023},
##     note = {R package version 4022.108},
##     url = {https://CRAN.R-project.org/package=timeDate},
##   }
## 
## 
## 
## 
## [[812]]
## 
## To cite package 'tinytest' in publications use:
## 
##   van der Loo M (2020). "A method for deriving information from running
##   R code." _The R Journal_, Accepted for publication.
##   <https://arxiv.org/abs/2002.07472>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Article{,
##     title = {A method for deriving information from running R code},
##     author = {MPJ {van der Loo}},
##     year = {2020},
##     journal = {The R Journal},
##     url = {https://arxiv.org/abs/2002.07472},
##     pages = {Accepted for publication},
##   }
## 
## 
## [[813]]
## 
## To cite package 'tinytex' in publications use:
## 
##   Xie Y (2023). _tinytex: Helper Functions to Install and Maintain TeX
##   Live, and Compile LaTeX Documents_. R package version 0.45,
##   <https://github.com/rstudio/tinytex>.
## 
##   Xie Y (2019). "TinyTeX: A lightweight, cross-platform, and
##   easy-to-maintain LaTeX distribution based on TeX Live." _TUGboat_,
##   *40*(1), 30-32. <https://tug.org/TUGboat/Contents/contents40-1.html>.
## 
## To see these entries in BibTeX format, use 'print(<citation>,
## bibtex=TRUE)', 'toBibtex(.)', or set
## 'options(citation.bibtex.max=999)'.
## 
## 
## [[814]]
## 
## To cite package 'titanic' in publications use:
## 
##   Hendricks P (2015). _titanic: Titanic Passenger Survival Data Set_. R
##   package version 0.1.0, <https://CRAN.R-project.org/package=titanic>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {titanic: Titanic Passenger Survival Data Set},
##     author = {Paul Hendricks},
##     year = {2015},
##     note = {R package version 0.1.0},
##     url = {https://CRAN.R-project.org/package=titanic},
##   }
## 
## 
## 
## 
## [[815]]
## 
## The 'tools' package is part of R.  To cite R in publications use:
## 
##   R Core Team (2022). R: A language and environment for statistical
##   computing. R Foundation for Statistical Computing, Vienna, Austria.
##   URL https://www.R-project.org/.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {R: A Language and Environment for Statistical Computing},
##     author = {{R Core Team}},
##     organization = {R Foundation for Statistical Computing},
##     address = {Vienna, Austria},
##     year = {2022},
##     url = {https://www.R-project.org/},
##   }
## 
## We have invested a lot of time and effort in creating R, please cite it
## when using it for data analysis. See also 'citation("pkgname")' for
## citing R packages.
## 
## 
## [[816]]
## 
## To cite TraMineRextras in publications please use:
## 
##   Ritschard, G., Studer, M., Bügin, R., Liao, T., Gabadinho, A., Fonta,
##   P.-A., Müller, N.S., & Rousset, P. (2021), Package TraMineRextras,
##   Comprehensive R Archive Network (CRAN)
## 
## For event sequences:
## 
##   Ritschard, G., Bügin, R., and Studer, M. (2013), Exploratory Mining
##   of Life Event Histories, In McArdle J.J. and G. Ritschard (eds)
##   Contemporary Issues in Exploratory Data Mining in the Behavioral
##   Sciences, pp. 221-253, New York: Routeledge
## 
##   Studer, M., Müller, N.S., Ritschard, G. & Gabadinho, A. (2010),
##   Classer, discriminer et visualiser des séquences d'événements, In
##   Extraction et gestion des connaissances (EGC 2010), Revue des
##   nouvelles technologies de l'information RNTI. Vol. E-19, pp. 37-48.
## 
## To see these entries in BibTeX format, use 'print(<citation>,
## bibtex=TRUE)', 'toBibtex(.)', or set
## 'options(citation.bibtex.max=999)'.
## 
## 
## [[817]]
## 
## To cite package 'triebeard' in publications use:
## 
##   Keyes O, Schmidt D, Takano Y (2016). _triebeard: 'Radix' Trees in
##   'Rcpp'_. R package version 0.3.0,
##   <https://CRAN.R-project.org/package=triebeard>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {triebeard: 'Radix' Trees in 'Rcpp'},
##     author = {Oliver Keyes and Drew Schmidt and Yuuki Takano},
##     year = {2016},
##     note = {R package version 0.3.0},
##     url = {https://CRAN.R-project.org/package=triebeard},
##   }
## 
## ATTENTION: This citation information has been auto-generated from the
## package DESCRIPTION file and may need manual editing, see
## 'help("citation")'.
## 
## 
## 
## 
## [[818]]
## 
## To cite package 'TTR' in publications use:
## 
##   Ulrich J (2021). _TTR: Technical Trading Rules_. R package version
##   0.24.3, <https://CRAN.R-project.org/package=TTR>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {TTR: Technical Trading Rules},
##     author = {Joshua Ulrich},
##     year = {2021},
##     note = {R package version 0.24.3},
##     url = {https://CRAN.R-project.org/package=TTR},
##   }
## 
## ATTENTION: This citation information has been auto-generated from the
## package DESCRIPTION file and may need manual editing, see
## 'help("citation")'.
## 
## 
## 
## 
## [[819]]
## 
## To cite package 'tune' in publications use:
## 
##   Kuhn M (2022). _tune: Tidy Tuning Tools_. R package version 1.0.1,
##   <https://CRAN.R-project.org/package=tune>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {tune: Tidy Tuning Tools},
##     author = {Max Kuhn},
##     year = {2022},
##     note = {R package version 1.0.1},
##     url = {https://CRAN.R-project.org/package=tune},
##   }
## 
## 
## 
## 
## [[820]]
## 
## To cite package 'twosamples' in publications use:
## 
##   Dowd C (2022). _twosamples: Fast Permutation Based Two Sample Tests_.
##   R package version 2.0.0,
##   <https://CRAN.R-project.org/package=twosamples>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {twosamples: Fast Permutation Based Two Sample Tests},
##     author = {Connor Dowd},
##     year = {2022},
##     note = {R package version 2.0.0},
##     url = {https://CRAN.R-project.org/package=twosamples},
##   }
## 
## 
## 
## 
## [[821]]
## 
## To cite package 'tzdb' in publications use:
## 
##   Vaughan D (2023). _tzdb: Time Zone Database Information_. R package
##   version 0.4.0, <https://CRAN.R-project.org/package=tzdb>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {tzdb: Time Zone Database Information},
##     author = {Davis Vaughan},
##     year = {2023},
##     note = {R package version 0.4.0},
##     url = {https://CRAN.R-project.org/package=tzdb},
##   }
## 
## 
## 
## 
## [[822]]
## 
## To cite UBL in publications use:
## 
##   Paula Branco, Rita P. Ribeiro, Luis Torgo (2016)., UBL: an R Package
##   for Utility-Based Learning, CoRR abs/1604.08079 [cs.MS], URL:
##   http://arxiv.org/abs/1604.08079
## 
## A BibTeX entry for LaTeX users is
## 
##   @Article{,
##     title = {{UBL}: an R Package for Utility-Based Learning},
##     author = {Paula Branco and Rita P. Ribeiro and Luis Torgo},
##     year = {2016},
##     ee = {http://arxiv.org/abs/1604.08079},
##     volume = {abs/1604.08079},
##     journal = {CoRR},
##   }
## 
## 
## [[823]]
## 
## To cite 'units' in publications use:
## 
##   Pebesma E, Mailund T, Hiebert J (2016). "Measurement Units in R." _R
##   Journal_, *8*(2), 486-494. doi:10.32614/RJ-2016-061
##   <https://doi.org/10.32614/RJ-2016-061>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Article{,
##     title = {Measurement Units in {R}},
##     author = {Edzer Pebesma and Thomas Mailund and James Hiebert},
##     year = {2016},
##     journal = {R Journal},
##     doi = {10.32614/RJ-2016-061},
##     pages = {486--494},
##     volume = {8},
##     number = {2},
##   }
## 
## 
## 
## 
## [[824]]
## 
## To cite package 'UpSetR' in publications use:
## 
##   Gehlenborg N (2019). _UpSetR: A More Scalable Alternative to Venn and
##   Euler Diagrams for Visualizing Intersecting Sets_. R package version
##   1.4.0, <https://CRAN.R-project.org/package=UpSetR>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {UpSetR: A More Scalable Alternative to Venn and Euler Diagrams for
## Visualizing Intersecting Sets},
##     author = {Nils Gehlenborg},
##     year = {2019},
##     note = {R package version 1.4.0},
##     url = {https://CRAN.R-project.org/package=UpSetR},
##   }
## 
## 
## 
## 
## [[825]]
## 
## To cite package 'urlchecker' in publications use:
## 
##   R Core team, Hester J, Csárdi G (2021). _urlchecker: Run CRAN URL
##   Checks from Older R Versions_. R package version 1.0.1,
##   <https://CRAN.R-project.org/package=urlchecker>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {urlchecker: Run CRAN URL Checks from Older R Versions},
##     author = {{R Core team} and Jim Hester and Gábor Csárdi},
##     year = {2021},
##     note = {R package version 1.0.1},
##     url = {https://CRAN.R-project.org/package=urlchecker},
##   }
## 
## 
## 
## 
## [[826]]
## 
## To cite package 'urltools' in publications use:
## 
##   Keyes O, Jacobs J, Schmidt D, Greenaway M, Rudis B, Pinto A,
##   Khezrzadeh M, Meilstrup P, Costello AM, Bezanson J, Meilstrup P,
##   Jiang X (2019). _urltools: Vectorised Tools for URL Handling and
##   Parsing_. R package version 1.7.3,
##   <https://CRAN.R-project.org/package=urltools>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {urltools: Vectorised Tools for URL Handling and Parsing},
##     author = {Os Keyes and Jay Jacobs and Drew Schmidt and Mark Greenaway and Bob Rudis and Alex Pinto and Maryam Khezrzadeh and Peter Meilstrup and Adam M. Costello and Jeff Bezanson and Peter Meilstrup and Xueyuan Jiang},
##     year = {2019},
##     note = {R package version 1.7.3},
##     url = {https://CRAN.R-project.org/package=urltools},
##   }
## 
## ATTENTION: This citation information has been auto-generated from the
## package DESCRIPTION file and may need manual editing, see
## 'help("citation")'.
## 
## 
## 
## 
## [[827]]
## 
## To cite package 'usethis' in publications use:
## 
##   Wickham H, Bryan J, Barrett M (2022). _usethis: Automate Package and
##   Project Setup_. R package version 2.1.6,
##   <https://CRAN.R-project.org/package=usethis>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {usethis: Automate Package and Project Setup},
##     author = {Hadley Wickham and Jennifer Bryan and Malcolm Barrett},
##     year = {2022},
##     note = {R package version 2.1.6},
##     url = {https://CRAN.R-project.org/package=usethis},
##   }
## 
## 
## 
## 
## [[828]]
## 
## To cite package 'UsingR' in publications use:
## 
##   Verzani J (2022). _UsingR: Data Sets, Etc. for the Text "Using R for
##   Introductory Statistics", Second Edition_. R package version 2.0-7,
##   <https://CRAN.R-project.org/package=UsingR>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {UsingR: Data Sets, Etc. for the Text "Using R for Introductory
## Statistics", Second Edition},
##     author = {John Verzani},
##     year = {2022},
##     note = {R package version 2.0-7},
##     url = {https://CRAN.R-project.org/package=UsingR},
##   }
## 
## ATTENTION: This citation information has been auto-generated from the
## package DESCRIPTION file and may need manual editing, see
## 'help("citation")'.
## 
## 
## 
## 
## [[829]]
## 
## To cite package 'utf8' in publications use:
## 
##   Perry PO (2023). _utf8: Unicode Text Processing_. R package version
##   1.2.4, <https://CRAN.R-project.org/package=utf8>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {utf8: Unicode Text Processing},
##     author = {Patrick O. Perry},
##     year = {2023},
##     note = {R package version 1.2.4},
##     url = {https://CRAN.R-project.org/package=utf8},
##   }
## 
## 
## 
## 
## [[830]]
## 
## The 'utils' package is part of R.  To cite R in publications use:
## 
##   R Core Team (2022). R: A language and environment for statistical
##   computing. R Foundation for Statistical Computing, Vienna, Austria.
##   URL https://www.R-project.org/.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {R: A Language and Environment for Statistical Computing},
##     author = {{R Core Team}},
##     organization = {R Foundation for Statistical Computing},
##     address = {Vienna, Austria},
##     year = {2022},
##     url = {https://www.R-project.org/},
##   }
## 
## We have invested a lot of time and effort in creating R, please cite it
## when using it for data analysis. See also 'citation("pkgname")' for
## citing R packages.
## 
## 
## [[831]]
## 
## To cite package 'uuid' in publications use:
## 
##   Urbanek S, Ts'o T (2022). _uuid: Tools for Generating and Handling of
##   UUIDs_. R package version 1.1-0,
##   <https://CRAN.R-project.org/package=uuid>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {uuid: Tools for Generating and Handling of UUIDs},
##     author = {Simon Urbanek and Theodore Ts'o},
##     year = {2022},
##     note = {R package version 1.1-0},
##     url = {https://CRAN.R-project.org/package=uuid},
##   }
## 
## ATTENTION: This citation information has been auto-generated from the
## package DESCRIPTION file and may need manual editing, see
## 'help("citation")'.
## 
## 
## 
## 
## [[832]]
## 
## To cite package 'V8' in publications use:
## 
##   Ooms J (2022). _V8: Embedded JavaScript and WebAssembly Engine for
##   R_. R package version 4.2.2, <https://CRAN.R-project.org/package=V8>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {V8: Embedded JavaScript and WebAssembly Engine for R},
##     author = {Jeroen Ooms},
##     year = {2022},
##     note = {R package version 4.2.2},
##     url = {https://CRAN.R-project.org/package=V8},
##   }
## 
## 
## 
## 
## [[833]]
## 
## To cite package vcd in publications use:
## 
##   David Meyer, Achim Zeileis, and Kurt Hornik (2022). vcd: Visualizing
##   Categorical Data. R package version 1.4-10.
## 
## To cite the strucplot framework (e.g., functions mosaic(), sieve(),
## assoc(), strucplot(), structable(), pairs.table(), cotabplot(),
## doubledecker()), additionally use:
## 
##   Meyer D, Zeileis A, Hornik K (2006). "The Strucplot Framework:
##   Visualizing Multi-Way Contingency Tables with vcd." _Journal of
##   Statistical Software_, *17*(3), 1-48. doi:10.18637/jss.v017.i03
##   <https://doi.org/10.18637/jss.v017.i03>.
## 
## If you use the residual-based shadings (in mosaic() or assoc()), please
## cite:
## 
##   Zeileis A, Meyer D, Hornik K (2007). "Residual-based Shadings for
##   Visualizing (Conditional) Independence." _Journal of Computational
##   and Graphical Statistics_, *16*(3), 507-525.
##   doi:10.1198/106186007X237856
##   <https://doi.org/10.1198/106186007X237856>.
## 
## To see these entries in BibTeX format, use 'print(<citation>,
## bibtex=TRUE)', 'toBibtex(.)', or set
## 'options(citation.bibtex.max=999)'.
## 
## 
## [[834]]
## 
## To cite package 'vctrs' in publications use:
## 
##   Wickham H, Henry L, Vaughan D (2023). _vctrs: Vector Helpers_. R
##   package version 0.6.4, <https://CRAN.R-project.org/package=vctrs>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {vctrs: Vector Helpers},
##     author = {Hadley Wickham and Lionel Henry and Davis Vaughan},
##     year = {2023},
##     note = {R package version 0.6.4},
##     url = {https://CRAN.R-project.org/package=vctrs},
##   }
## 
## 
## 
## 
## [[835]]
## 
## To cite package 'vegan' in publications use:
## 
##   Oksanen J, Simpson G, Blanchet F, Kindt R, Legendre P, Minchin P,
##   O'Hara R, Solymos P, Stevens M, Szoecs E, Wagner H, Barbour M,
##   Bedward M, Bolker B, Borcard D, Carvalho G, Chirico M, De Caceres M,
##   Durand S, Evangelista H, FitzJohn R, Friendly M, Furneaux B, Hannigan
##   G, Hill M, Lahti L, McGlinn D, Ouellette M, Ribeiro Cunha E, Smith T,
##   Stier A, Ter Braak C, Weedon J (2022). _vegan: Community Ecology
##   Package_. R package version 2.6-4,
##   <https://CRAN.R-project.org/package=vegan>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {vegan: Community Ecology Package},
##     author = {Jari Oksanen and Gavin L. Simpson and F. Guillaume Blanchet and Roeland Kindt and Pierre Legendre and Peter R. Minchin and R.B. O'Hara and Peter Solymos and M. Henry H. Stevens and Eduard Szoecs and Helene Wagner and Matt Barbour and Michael Bedward and Ben Bolker and Daniel Borcard and Gustavo Carvalho and Michael Chirico and Miquel {De Caceres} and Sebastien Durand and Heloisa Beatriz Antoniazi Evangelista and Rich FitzJohn and Michael Friendly and Brendan Furneaux and Geoffrey Hannigan and Mark O. Hill and Leo Lahti and Dan McGlinn and Marie-Helene Ouellette and Eduardo {Ribeiro Cunha} and Tyler Smith and Adrian Stier and Cajo J.F. {Ter Braak} and James Weedon},
##     year = {2022},
##     note = {R package version 2.6-4},
##     url = {https://CRAN.R-project.org/package=vegan},
##   }
## 
## 
## 
## 
## [[836]]
## 
## To cite VGAM in publications please use:
## 
##   Thomas W. Yee (2015). Vector Generalized Linear and Additive Models:
##   With an Implementation in R. New York, USA: Springer.
## 
##   Thomas W. Yee and C. J. Wild (1996). Vector Generalized Additive
##   Models. Journal of Royal Statistical Society, Series B, 58(3),
##   481-493.
## 
## and/or
## 
##   Thomas W. Yee (2010). The VGAM Package for Categorical Data Analysis.
##   Journal of Statistical Software, 32(10), 1-34. DOI:
##   10.18637/jss.v032.i10. URL
##   https://www.jstatsoft.org/article/view/v032i10/.
## 
## and/or
## 
##   Thomas W. Yee, Alfian F. Hadi (2014). Row-column interaction models,
##   with an R implementation. Computational Statistics, 29(6),
##   1427--1445.
## 
## and/or
## 
##   Thomas W. Yee (2022). VGAM: Vector Generalized Linear and Additive
##   Models. R package version 1.1-7. URL
##   https://CRAN.R-project.org/package=VGAM
## 
## and/or
## 
##   Thomas W. Yee (2013). Two-parameter reduced-rank vector generalized
##   linear models. Computational Statistics and Data Analysis.
## 
## and/or
## 
##   Thomas W. Yee, Jakub Stoklosa, Richard M. Huggins (2015). The VGAM
##   Package for Capture-Recapture Data Using the Conditional Likelihood.
##   Journal of Statistical Software, 65(5), 1-33. DOI:
##   10.18637/jss.v065.i05. URL
##   https://www.jstatsoft.org/article/view/v065i05/.
## 
## and/or
## 
##   Thomas W. Yee (2020). The VGAM package for negative binomial
##   regression. Australian and New Zealand Journal of Statistics.
## 
## To see these entries in BibTeX format, use 'print(<citation>,
## bibtex=TRUE)', 'toBibtex(.)', or set
## 'options(citation.bibtex.max=999)'.
## 
## 
## [[837]]
## 
## To cite VIM in publications use:
## 
##   Alexander Kowarik, Matthias Templ (2016). Imputation with the R
##   Package VIM. Journal of Statistical Software, 74(7), 1-16.
##   doi:10.18637/jss.v074.i07
## 
## A BibTeX entry for LaTeX users is
## 
##   @Article{,
##     title = {Imputation with the {R} Package {VIM}},
##     author = {Alexander Kowarik and Matthias Templ},
##     journal = {Journal of Statistical Software},
##     year = {2016},
##     volume = {74},
##     number = {7},
##     pages = {1--16},
##     doi = {10.18637/jss.v074.i07},
##   }
## 
## 
## 
## 
## [[838]]
## 
## To cite package 'vipor' in publications use:
## 
##   Sherrill-Mix S, Clarke E (2017). _vipor: Plot Categorical Data Using
##   Quasirandom Noise and Density Estimates_. R package version 0.4.5,
##   <https://CRAN.R-project.org/package=vipor>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {vipor: Plot Categorical Data Using Quasirandom Noise and Density
## Estimates},
##     author = {Scott Sherrill-Mix and Erik Clarke},
##     year = {2017},
##     note = {R package version 0.4.5},
##     url = {https://CRAN.R-project.org/package=vipor},
##   }
## 
## ATTENTION: This citation information has been auto-generated from the
## package DESCRIPTION file and may need manual editing, see
## 'help("citation")'.
## 
## 
## 
## 
## [[839]]
## 
## To cite viridis/viridisLite in publications use:
## 
##   Simon Garnier, Noam Ross, Robert Rudis, Antônio P. Camargo, Marco
##   Sciaini, and Cédric Scherer (2021). Rvision - Colorblind-Friendly
##   Color Maps for R. R package version 0.6.2.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {{viridis} - Colorblind-Friendly Color Maps for R},
##     author = {{Garnier} and {Simon} and {Ross} and {Noam} and {Rudis} and {Robert} and {Camargo} and Antônio Pedro and {Sciaini} and {Marco} and {Scherer} and {Cédric}},
##     year = {2021},
##     note = {R package version 0.6.2},
##     url = {https://sjmgarnier.github.io/viridis/},
##     doi = {10.5281/zenodo.4679424},
##     doi = {10.5281/zenodo.4679424},
##   }
## 
## 
## [[840]]
## 
## To cite viridis/viridisLite in publications use:
## 
##   Simon Garnier, Noam Ross, Robert Rudis, Antônio P. Camargo, Marco
##   Sciaini, and Cédric Scherer (2023). viridis(Lite) -
##   Colorblind-Friendly Color Maps for R. viridisLite package version
##   0.4.2.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {{viridis(Lite)} - Colorblind-Friendly Color Maps for R},
##     author = {{Garnier} and {Simon} and {Ross} and {Noam} and {Rudis} and {Robert} and {Camargo} and Antônio Pedro and {Sciaini} and {Marco} and {Scherer} and {Cédric}},
##     year = {2023},
##     note = {viridisLite package version 0.4.2},
##     url = {https://sjmgarnier.github.io/viridis/},
##     doi = {10.5281/zenodo.4678327},
##   }
## 
## 
## [[841]]
## 
## To cite package 'visdat' in publications use:
## 
##   Tierney N (2017). "visdat: Visualising Whole Data Frames." _JOSS_,
##   *2*(16), 355. doi:10.21105/joss.00355
##   <https://doi.org/10.21105/joss.00355>,
##   <http://dx.doi.org/10.21105/joss.00355>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Article{,
##     title = {visdat: Visualising Whole Data Frames},
##     author = {Nicholas Tierney},
##     doi = {10.21105/joss.00355},
##     url = {http://dx.doi.org/10.21105/joss.00355},
##     year = {2017},
##     publisher = {Journal of Open Source Software},
##     volume = {2},
##     number = {16},
##     pages = {355},
##     journal = {JOSS},
##   }
## 
## 
## [[842]]
## 
## To cite package 'visNetwork' in publications use:
## 
##   Almende B.V. and Contributors, Thieurmel B (2022). _visNetwork:
##   Network Visualization using 'vis.js' Library_. R package version
##   2.1.2, <https://CRAN.R-project.org/package=visNetwork>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {visNetwork: Network Visualization using 'vis.js' Library},
##     author = {{Almende B.V. and Contributors} and Benoit Thieurmel},
##     year = {2022},
##     note = {R package version 2.1.2},
##     url = {https://CRAN.R-project.org/package=visNetwork},
##   }
## 
## 
## 
## 
## [[843]]
## 
## To cite package 'vroom' in publications use:
## 
##   Hester J, Wickham H, Bryan J (2023). _vroom: Read and Write
##   Rectangular Text Data Quickly_. R package version 1.6.4,
##   <https://CRAN.R-project.org/package=vroom>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {vroom: Read and Write Rectangular Text Data Quickly},
##     author = {Jim Hester and Hadley Wickham and Jennifer Bryan},
##     year = {2023},
##     note = {R package version 1.6.4},
##     url = {https://CRAN.R-project.org/package=vroom},
##   }
## 
## 
## 
## 
## [[844]]
## 
## To cite package 'vtable' in publications use:
## 
##   Huntington-Klein N (2023). _vtable: Variable Table for Variable
##   Documentation_. R package version 1.4.4,
##   <https://CRAN.R-project.org/package=vtable>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {vtable: Variable Table for Variable Documentation},
##     author = {Nick Huntington-Klein},
##     year = {2023},
##     note = {R package version 1.4.4},
##     url = {https://CRAN.R-project.org/package=vtable},
##   }
## 
## 
## 
## 
## [[845]]
## 
## To cite package 'waldo' in publications use:
## 
##   Wickham H (2023). _waldo: Find Differences Between R Objects_. R
##   package version 0.5.2, <https://CRAN.R-project.org/package=waldo>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {waldo: Find Differences Between R Objects},
##     author = {Hadley Wickham},
##     year = {2023},
##     note = {R package version 0.5.2},
##     url = {https://CRAN.R-project.org/package=waldo},
##   }
## 
## 
## 
## 
## [[846]]
## 
## To cite package 'warp' in publications use:
## 
##   Vaughan D (2020). _warp: Group Dates_. R package version 0.2.0,
##   <https://CRAN.R-project.org/package=warp>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {warp: Group Dates},
##     author = {Davis Vaughan},
##     year = {2020},
##     note = {R package version 0.2.0},
##     url = {https://CRAN.R-project.org/package=warp},
##   }
## 
## 
## 
## 
## [[847]]
## 
## To cite package 'webshot' in publications use:
## 
##   Chang W (2022). _webshot: Take Screenshots of Web Pages_. R package
##   version 0.5.4, <https://CRAN.R-project.org/package=webshot>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {webshot: Take Screenshots of Web Pages},
##     author = {Winston Chang},
##     year = {2022},
##     note = {R package version 0.5.4},
##     url = {https://CRAN.R-project.org/package=webshot},
##   }
## 
## 
## 
## 
## [[848]]
## 
## To cite package 'whisker' in publications use:
## 
##   de Jonge E (2022). _whisker: mustache for R, Logicless Templating_. R
##   package version 0.4.1, <https://CRAN.R-project.org/package=whisker>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {whisker: {{mustache}} for R, Logicless Templating},
##     author = {Edwin {de Jonge}},
##     year = {2022},
##     note = {R package version 0.4.1},
##     url = {https://CRAN.R-project.org/package=whisker},
##   }
## 
## ATTENTION: This citation information has been auto-generated from the
## package DESCRIPTION file and may need manual editing, see
## 'help("citation")'.
## 
## 
## 
## 
## [[849]]
## 
## To cite package 'withr' in publications use:
## 
##   Hester J, Henry L, Müller K, Ushey K, Wickham H, Chang W (2023).
##   _withr: Run Code 'With' Temporarily Modified Global State_. R package
##   version 2.5.2, <https://CRAN.R-project.org/package=withr>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {withr: Run Code 'With' Temporarily Modified Global State},
##     author = {Jim Hester and Lionel Henry and Kirill Müller and Kevin Ushey and Hadley Wickham and Winston Chang},
##     year = {2023},
##     note = {R package version 2.5.2},
##     url = {https://CRAN.R-project.org/package=withr},
##   }
## 
## 
## 
## 
## [[850]]
## 
## To cite package 'wk' in publications use:
## 
##   Dunnington D, Pebesma E (2023). _wk: Lightweight Well-Known Geometry
##   Parsing_. R package version 0.7.2,
##   <https://CRAN.R-project.org/package=wk>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {wk: Lightweight Well-Known Geometry Parsing},
##     author = {Dewey Dunnington and Edzer Pebesma},
##     year = {2023},
##     note = {R package version 0.7.2},
##     url = {https://CRAN.R-project.org/package=wk},
##   }
## 
## 
## 
## 
## [[851]]
## 
## To cite package 'wooldridge' in publications use:
## 
##   Shea J (2021). _wooldridge: 115 Data Sets from "Introductory
##   Econometrics: A Modern Approach, 7e" by Jeffrey M. Wooldridge_. R
##   package version 1.4-2,
##   <https://CRAN.R-project.org/package=wooldridge>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {wooldridge: 115 Data Sets from "Introductory Econometrics: A Modern
## Approach, 7e" by Jeffrey M. Wooldridge},
##     author = {Justin M. Shea},
##     year = {2021},
##     note = {R package version 1.4-2},
##     url = {https://CRAN.R-project.org/package=wooldridge},
##   }
## 
## 
## 
## 
## [[852]]
## 
## To cite package 'workflows' in publications use:
## 
##   Vaughan D, Couch S (2022). _workflows: Modeling Workflows_. R package
##   version 1.1.2, <https://CRAN.R-project.org/package=workflows>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {workflows: Modeling Workflows},
##     author = {Davis Vaughan and Simon Couch},
##     year = {2022},
##     note = {R package version 1.1.2},
##     url = {https://CRAN.R-project.org/package=workflows},
##   }
## 
## 
## 
## 
## [[853]]
## 
## To cite package 'workflowsets' in publications use:
## 
##   Kuhn M, Couch S (2022). _workflowsets: Create a Collection of
##   'tidymodels' Workflows_. R package version 1.0.0,
##   <https://CRAN.R-project.org/package=workflowsets>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {workflowsets: Create a Collection of 'tidymodels' Workflows},
##     author = {Max Kuhn and Simon Couch},
##     year = {2022},
##     note = {R package version 1.0.0},
##     url = {https://CRAN.R-project.org/package=workflowsets},
##   }
## 
## 
## 
## 
## [[854]]
## 
## To cite package 'writexl' in publications use:
## 
##   Ooms J (2023). _writexl: Export Data Frames to Excel 'xlsx' Format_.
##   R package version 1.4.2,
##   <https://CRAN.R-project.org/package=writexl>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {writexl: Export Data Frames to Excel 'xlsx' Format},
##     author = {Jeroen Ooms},
##     year = {2023},
##     note = {R package version 1.4.2},
##     url = {https://CRAN.R-project.org/package=writexl},
##   }
## 
## 
## 
## 
## [[855]]
## 
## To cite package 'xfun' in publications use:
## 
##   Xie Y (2023). _xfun: Supporting Functions for Packages Maintained by
##   'Yihui Xie'_. R package version 0.39,
##   <https://CRAN.R-project.org/package=xfun>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {xfun: Supporting Functions for Packages Maintained by 'Yihui Xie'},
##     author = {Yihui Xie},
##     year = {2023},
##     note = {R package version 0.39},
##     url = {https://CRAN.R-project.org/package=xfun},
##   }
## 
## 
## 
## 
## [[856]]
## 
## To cite package 'xgboost' in publications use:
## 
##   Chen T, He T, Benesty M, Khotilovich V, Tang Y, Cho H, Chen K,
##   Mitchell R, Cano I, Zhou T, Li M, Xie J, Lin M, Geng Y, Li Y, Yuan J
##   (2023). _xgboost: Extreme Gradient Boosting_. R package version
##   1.7.3.1, <https://CRAN.R-project.org/package=xgboost>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {xgboost: Extreme Gradient Boosting},
##     author = {Tianqi Chen and Tong He and Michael Benesty and Vadim Khotilovich and Yuan Tang and Hyunsu Cho and Kailong Chen and Rory Mitchell and Ignacio Cano and Tianyi Zhou and Mu Li and Junyuan Xie and Min Lin and Yifeng Geng and Yutian Li and Jiaming Yuan},
##     year = {2023},
##     note = {R package version 1.7.3.1},
##     url = {https://CRAN.R-project.org/package=xgboost},
##   }
## 
## 
## 
## 
## [[857]]
## 
## To cite package 'xml2' in publications use:
## 
##   Wickham H, Hester J, Ooms J (2023). _xml2: Parse XML_. R package
##   version 1.3.4, <https://CRAN.R-project.org/package=xml2>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {xml2: Parse XML},
##     author = {Hadley Wickham and Jim Hester and Jeroen Ooms},
##     year = {2023},
##     note = {R package version 1.3.4},
##     url = {https://CRAN.R-project.org/package=xml2},
##   }
## 
## 
## 
## 
## [[858]]
## 
## To cite package 'xmlparsedata' in publications use:
## 
##   Csárdi G (2021). _xmlparsedata: Parse Data of 'R' Code as an 'XML'
##   Tree_. R package version 1.0.5,
##   <https://CRAN.R-project.org/package=xmlparsedata>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {xmlparsedata: Parse Data of 'R' Code as an 'XML' Tree},
##     author = {Gábor Csárdi},
##     year = {2021},
##     note = {R package version 1.0.5},
##     url = {https://CRAN.R-project.org/package=xmlparsedata},
##   }
## 
## ATTENTION: This citation information has been auto-generated from the
## package DESCRIPTION file and may need manual editing, see
## 'help("citation")'.
## 
## 
## 
## 
## [[859]]
## 
## To cite package 'xopen' in publications use:
## 
##   Csárdi G, Boudra F, Dieter R, Krammer K, White J (2018). _xopen: Open
##   System Files, 'URLs', Anything_. R package version 1.0.0,
##   <https://CRAN.R-project.org/package=xopen>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {xopen: Open System Files, 'URLs', Anything},
##     author = {Gábor Csárdi and Fathi Boudra and Rex Dieter and Kevin Krammer and Jeremy White},
##     year = {2018},
##     note = {R package version 1.0.0},
##     url = {https://CRAN.R-project.org/package=xopen},
##   }
## 
## 
## 
## 
## [[860]]
## 
## To cite package 'xtable' in publications use:
## 
##   Dahl D, Scott D, Roosen C, Magnusson A, Swinton J (2019). _xtable:
##   Export Tables to LaTeX or HTML_. R package version 1.8-4,
##   <https://CRAN.R-project.org/package=xtable>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {xtable: Export Tables to LaTeX or HTML},
##     author = {David B. Dahl and David Scott and Charles Roosen and Arni Magnusson and Jonathan Swinton},
##     year = {2019},
##     note = {R package version 1.8-4},
##     url = {https://CRAN.R-project.org/package=xtable},
##   }
## 
## 
## 
## 
## [[861]]
## 
## To cite package 'xts' in publications use:
## 
##   Ryan JA, Ulrich JM (2023). _xts: eXtensible Time Series_. R package
##   version 0.13.1, <https://CRAN.R-project.org/package=xts>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {xts: eXtensible Time Series},
##     author = {Jeffrey A. Ryan and Joshua M. Ulrich},
##     year = {2023},
##     note = {R package version 0.13.1},
##     url = {https://CRAN.R-project.org/package=xts},
##   }
## 
## 
## 
## 
## [[862]]
## 
## To cite package 'yaml' in publications use:
## 
##   Garbett SP, Stephens J, Simonov K, Xie Y, Dong Z, Wickham H, Horner
##   J, reikoch, Beasley W, O'Connor B, Warnes GR, Quinn M, Kamvar ZN
##   (2023). _yaml: Methods to Convert R Data to YAML and Back_. R package
##   version 2.3.7, <https://CRAN.R-project.org/package=yaml>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {yaml: Methods to Convert R Data to YAML and Back},
##     author = {Shawn P Garbett and Jeremy Stephens and Kirill Simonov and Yihui Xie and Zhuoer Dong and Hadley Wickham and Jeffrey Horner and {reikoch} and Will Beasley and Brendan O'Connor and Gregory R. Warnes and Michael Quinn and Zhian N. Kamvar},
##     year = {2023},
##     note = {R package version 2.3.7},
##     url = {https://CRAN.R-project.org/package=yaml},
##   }
## 
## ATTENTION: This citation information has been auto-generated from the
## package DESCRIPTION file and may need manual editing, see
## 'help("citation")'.
## 
## 
## 
## 
## [[863]]
## 
## To cite package 'yardstick' in publications use:
## 
##   Kuhn M, Vaughan D, Hvitfeldt E (2022). _yardstick: Tidy
##   Characterizations of Model Performance_. R package version 1.1.0,
##   <https://CRAN.R-project.org/package=yardstick>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {yardstick: Tidy Characterizations of Model Performance},
##     author = {Max Kuhn and Davis Vaughan and Emil Hvitfeldt},
##     year = {2022},
##     note = {R package version 1.1.0},
##     url = {https://CRAN.R-project.org/package=yardstick},
##   }
## 
## 
## 
## 
## [[864]]
## 
## To cite package 'zeallot' in publications use:
## 
##   Teetor N (2018). _zeallot: Multiple, Unpacking, and Destructuring
##   Assignment_. R package version 0.1.0,
##   <https://CRAN.R-project.org/package=zeallot>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {zeallot: Multiple, Unpacking, and Destructuring Assignment},
##     author = {Nathan Teetor},
##     year = {2018},
##     note = {R package version 0.1.0},
##     url = {https://CRAN.R-project.org/package=zeallot},
##   }
## 
## 
## 
## 
## [[865]]
## 
## To cite package 'Zelig' in publications use:
## 
##   Owen M, Imai K, King G, Lau O (2013). _Zelig: Everyone's Statistical
##   Software_. R package version 4.2-1,
##   <https://CRAN.R-project.org/package=Zelig>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {Zelig: Everyone's Statistical Software},
##     author = {Matt Owen and Kosuke Imai and Gary King and Olivia Lau},
##     year = {2013},
##     note = {R package version 4.2-1},
##     url = {https://CRAN.R-project.org/package=Zelig},
##   }
## 
## ATTENTION: This citation information has been auto-generated from the
## package DESCRIPTION file and may need manual editing, see
## 'help("citation")'.
## 
## 
## 
## 
## [[866]]
## 
## To cite package 'zip' in publications use:
## 
##   Csárdi G, Podgórski K, Geldreich R (2022). _zip: Cross-Platform 'zip'
##   Compression_. R package version 2.2.2,
##   <https://CRAN.R-project.org/package=zip>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {zip: Cross-Platform 'zip' Compression},
##     author = {Gábor Csárdi and Kuba Podgórski and Rich Geldreich},
##     year = {2022},
##     note = {R package version 2.2.2},
##     url = {https://CRAN.R-project.org/package=zip},
##   }
## 
## ATTENTION: This citation information has been auto-generated from the
## package DESCRIPTION file and may need manual editing, see
## 'help("citation")'.
## 
## 
## 
## 
## [[867]]
## 
## To cite zoo in publications use:
## 
##   Zeileis A, Grothendieck G (2005). "zoo: S3 Infrastructure for Regular
##   and Irregular Time Series." _Journal of Statistical Software_,
##   *14*(6), 1-27. doi:10.18637/jss.v014.i06
##   <https://doi.org/10.18637/jss.v014.i06>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Article{,
##     title = {zoo: S3 Infrastructure for Regular and Irregular Time Series},
##     author = {Achim Zeileis and Gabor Grothendieck},
##     journal = {Journal of Statistical Software},
##     year = {2005},
##     volume = {14},
##     number = {6},
##     pages = {1--27},
##     doi = {10.18637/jss.v014.i06},
##   }