Remove Packages / Clear Memory

Load

Load R Libraries

######Libraries#############################
suppressWarnings({
require(Amelia)      
require(broom)
require(car)         
require(caret)
require(corrplot)
require(dplyr)     
require(e1071)
require(fastDummies)
require(fmsb)
require(formattable)
require(ggplot2)     
require(ggcorrplot)  
require(ggExtra) 
require(glmnet)
require(glmpath) 
require(grid)        
require(gridExtra)  
require(Hmisc)
require(kableExtra)
require(kernlab)
require(knitr)
require(leaflet)
require(leaflet.extras)
require(leaps)  
require(maptools)    
require(MASS)    
require(imbalance)
require(MLmetrics)
require(mlpack)
require(nnet)
require(pROC)
require(PRROC)
require(psych)       
require(raster)      
require(RColorBrewer)
require(ResourceSelection)
require(reticulate)
require(rgdal)       
require(rgeos)  
require(rpart)
require(rpart.plot)
require(shiny)       
require(sf)    
require(sjPlot)
require(sp)          
require(tidyverse)   
})    
## Loading required package: Amelia
## Loading required package: Rcpp
## ## 
## ## Amelia II: Multiple Imputation
## ## (Version 1.8.2, built: 2024-04-10)
## ## Copyright (C) 2005-2024 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
## Thank you for using fastDummies!
## To acknowledge our work, please cite the package:
## Kaplan, J. & Schlegel, B. (2023). fastDummies: Fast Creation of Dummy (Binary) Columns and Rows from Categorical Variables. Version 1.7.1. URL: https://github.com/jacobkap/fastDummies, https://jacobkap.github.io/fastDummies/.
## Loading required package: fmsb
## Registered S3 methods overwritten by 'fmsb':
##   method    from
##   print.roc pROC
##   plot.roc  pROC
## Loading required package: formattable
## Loading required package: ggcorrplot
## Loading required package: ggExtra
## Loading required package: glmnet
## Loading required package: Matrix
## Loaded glmnet 4.1-8
## 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: Hmisc
## 
## Attaching package: 'Hmisc'
## The following object is masked from 'package:e1071':
## 
##     impute
## The following objects are masked from 'package:dplyr':
## 
##     src, summarize
## The following objects are masked from 'package:base':
## 
##     format.pval, units
## Loading required package: kableExtra
## 
## Attaching package: 'kableExtra'
## The following object is masked from 'package:dplyr':
## 
##     group_rows
## Loading required package: kernlab
## 
## Attaching package: 'kernlab'
## The following object is masked from 'package:ggplot2':
## 
##     alpha
## Loading required package: knitr
## Loading required package: leaflet
## Loading required package: leaflet.extras
## Loading required package: leaps
## Loading required package: maptools
## Loading required package: MASS
## 
## Attaching package: 'MASS'
## The following object is masked from 'package:formattable':
## 
##     area
## 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
## 
## Attaching package: 'mlpack'
## The following object is masked from 'package:Matrix':
## 
##     det
## The following object is masked from 'package:stats':
## 
##     kmeans
## The following object is masked from 'package:base':
## 
##     det
## Loading required package: nnet
## Loading required package: pROC
## Type 'citation("pROC")' for a citation.
## 
## Attaching package: 'pROC'
## The following object is masked from 'package:fmsb':
## 
##     roc
## The following objects are masked from 'package:stats':
## 
##     cov, smooth, var
## Loading required package: PRROC
## Loading required package: psych
## 
## Attaching package: 'psych'
## The following object is masked from 'package:mlpack':
## 
##     pca
## The following object is masked from 'package:MLmetrics':
## 
##     AUC
## The following object is masked from 'package:kernlab':
## 
##     alpha
## The following object is masked from 'package:Hmisc':
## 
##     describe
## The following objects are masked from 'package:ggplot2':
## 
##     %+%, alpha
## The following object is masked from 'package:car':
## 
##     logit
## Loading required package: raster
## Loading required package: sp
## 
## Attaching package: 'raster'
## The following object is masked from 'package:MASS':
## 
##     select
## The following object is masked from 'package:kernlab':
## 
##     rotated
## The following object is masked from 'package:dplyr':
## 
##     select
## Loading required package: RColorBrewer
## Loading required package: ResourceSelection
## ResourceSelection 0.3-6   2023-06-27
## Loading required package: reticulate
## Loading required package: rgdal
## Loading required package: rgeos
## Loading required package: rpart
## Loading required package: rpart.plot
## Loading required package: shiny
## 
## Attaching package: 'shiny'
## The following object is masked from 'package:ggExtra':
## 
##     runExample
## Loading required package: sf
## Linking to GEOS 3.11.2, GDAL 3.8.2, PROJ 9.3.1; sf_use_s2() is TRUE
## Loading required package: sjPlot
## Learn more about sjPlot with 'browseVignettes("sjPlot")'.
## Loading required package: tidyverse
## ── Attaching core tidyverse packages ──────────────────────── tidyverse 2.0.0 ──
## ✔ forcats   1.0.0     ✔ stringr   1.5.1
## ✔ lubridate 1.9.3     ✔ 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 kernlab::alpha(), ggplot2::alpha()
## ✖ gridExtra::combine()     masks dplyr::combine()
## ✖ purrr::cross()           masks kernlab::cross()
## ✖ 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()
## ✖ Hmisc::src()             masks dplyr::src()
## ✖ Hmisc::summarize()       masks dplyr::summarize()
## ✖ tidyr::unpack()          masks Matrix::unpack()
## ℹ Use the conflicted package (<http://conflicted.r-lib.org/>) to force all conflicts to become errors
############################################

Load Preliminary Functions

# Define a custom print function that prints the input
myprint <- function(x) {
  if (is.data.frame(x) || is.matrix(x)) {
    x %>%
      kbl() %>%
      kable_classic(full_width = FALSE, font_size = 16) %>%
      kable_styling(font = "Cambria") %>%
      print()
  } else {
    print(x)
  }
}

# Define a custom citation function that gets the citation for the input package
mycite <- function(x) {
  citation(x)
}

# Define a function to calculate and plot the correlation matrix of a dataset
corfunction <- function(d) {
  # Calculate the correlation matrix of the dataset
  mycorr <- cor(d[, 1:ncol(d)])
  
  # Calculate the p-values for the correlation matrix
  p.mat <- ggcorrplot::cor_pmat(d[, 1:ncol(d)])
  
  # Create the correlation plot using ggcorrplot
  myplot <- ggcorrplot(
    mycorr,                       # Correlation matrix
    hc.order = TRUE,              # Use hierarchical clustering order
    type = "lower",               # Display the lower triangle of the matrix
    colors = c("red", "white", "green"),  # Colors for the correlation values
    tl.cex = 8,                   # Text label size for the axis
    tl.col = "black",             # Text label color
    lab = TRUE,                   # Display correlation values on the plot
    lab_size = 2,                 # Size of the correlation value labels
    p.mat = p.mat,                # Matrix of p-values for significance testing
    insig = "pch",                # Mark insignificant correlations
    pch = 4                       # Shape of the mark for insignificant correlations
  )
  
  # Print the correlation plot
  print(myplot)
}

Load Geography

# Set the working directory to the specified path
setwd("C:/Users/lfult/Documents/Bankruptcy Study/")

# Load the shapefile using the 'raster' package
myshape <- raster::shapefile("cb_2018_us_county_20m.shp")

# Convert the STATEFP attribute in the shapefile to numeric and assign it to a new column 'M'
myshape$M <- as.numeric(myshape$STATEFP)

Load Flat Files

# Read the CSV file 'lags_final4.csv' into a data frame named 'bankrupt0'
# Set 'stringsAsFactors' to TRUE to convert strings to factors
bankrupt0 <- read.csv('lags_final4.csv', stringsAsFactors = T)

# Create a copy of 'bankrupt0' and assign it to a new data frame named 'bankrupt'
bankrupt <- bankrupt0

# Convert the 'AR_by_OpIncome' column in the 'bankrupt' data frame to numeric
bankrupt$AR_by_OpIncome <- as.numeric(bankrupt$AR_by_OpIncome)

# Plot a missing value map for the 'bankrupt' data frame
# 'x.cex' controls the size of the axis labels in the plot
missmap(bankrupt, x.cex = 0.5)

Scale Appropriate Variables

# Scale down the 'AR_by_OpIncome' column by dividing by 1000
bankrupt$AR_by_OpIncome <- bankrupt$AR_by_OpIncome / 1000

# Scale down the 'AR_by_OpIncome.y.1.' column by dividing by 1000
bankrupt$AR_by_OpIncome.y.1. <- bankrupt$AR_by_OpIncome.y.1. / 1000

# Scale down the 'AR_by_OpIncome.y.2.' column by dividing by 1000
bankrupt$AR_by_OpIncome.y.2. <- bankrupt$AR_by_OpIncome.y.2. / 1000

# Scale down the 'AdjPxDays' column by dividing by 10000
bankrupt$AdjPxDays <- bankrupt$AdjPxDays / 10000

# Scale down the 'AdjPxDays.y.1.' column by dividing by 10000
bankrupt$AdjPxDays.y.1. <- bankrupt$AdjPxDays.y.1. / 10000

# Scale down the 'AdjPxDays.y.2.' column by dividing by 10000
bankrupt$AdjPxDays.y.2. <- bankrupt$AdjPxDays.y.2. / 10000

Merge Files

# Define a custom function 'myf' that calculates the mean of a given vector 'x'
myf <- function(x) mean(x)

# Aggregate the 'Bankrupt' column of the 'bankrupt' data frame by the 'GeoCode' column
# and apply the custom function 'myf' to each group
formap <- as.data.frame(aggregate(bankrupt$Bankrupt, by = list(bankrupt$GeoCode), FUN = myf))

# Rename the columns of the 'formap' data frame to 'M' and 'Bankrupt'
colnames(formap) <- c('M', 'Bankrupt')

# Merge the 'formap' data frame with the 'myshape' shapefile based on the 'M' column
# Keep all rows from 'formap' that match rows in 'myshape'
formap <- sp::merge(myshape, formap, by = "M", all.x = FALSE)

# Assign the 'formap' data frame to the 'temp' variable for temporary storage
temp <- formap

# Set the 'formap' variable to NULL, effectively clearing it
formap <- NULL

Map Bankruptcies

Map of bankruptcies

# Create a color palette function for the 'Bankrupt' data
# The colors range from white to green, yellow, orange, red, and black
# The bins are defined by the values (0, 0.02, 0.04, 0.06, 0.08, 0.10, 0.12, 0.14)
qpal <- colorBin(c("white", "green", "yellow", "orange", "red", "black"), 
                 bins = c(0, 0.02, 0.04, 0.06, 0.08, 0.10, 0.12, 0.14))

# Create a leaflet map object using the 'temp' data frame
leaf <- leaflet(temp) %>%
  # Add default OpenStreetMap tiles
  addTiles(group = "OSM (default)") %>%
  
  # Add a map pane for borders with a specified z-index
  addMapPane("borders", zIndex = 410) %>%
  
  # Add black polylines for the borders
  addPolylines(data = temp, color = "black", 
               opacity = 1, weight = 1, group = "Borders", 
               options = pathOptions(pane = "borders")) %>%
  
  # Set the initial map view to show the full extent of the USA
  fitBounds(-124.8, -66.9, 24.4, 49.4) %>%
  
  # Set the initial map view to a specific location and zoom level
  setView(-98.6, 39.83, zoom = 4) %>%
  
  # Add polygons for each region, with no stroke, full opacity, and smooth edges
  # The fill color is determined by the 'Bankrupt' data using the 'qpal' color palette
  addPolygons(stroke = FALSE, fillOpacity = 1, smoothFactor = 0.2, 
              color = ~qpal(temp@data$Bankrupt), 
              popup = paste("County: ", temp@data$NAME, "<br>", 
                            "Bankruptcies: ", temp@data$Bankrupt, "<br>")) %>%
  
  # Add a legend to the bottom right of the map
  # The legend uses the 'qpal' color palette and shows values for the 'Bankrupt' data
  addLegend(data = temp, "bottomright", opacity = 1, pal = qpal, 
            values = ~temp@data$Bankrupt, title = "% Bankruptcies")
## Warning in qpal(temp@data$Bankrupt): Some values were outside the color scale
## and will be treated as NA
## Warning in qpal(temp@data$Bankrupt): Some values were outside the color scale
## and will be treated as NA
# Display the leaflet map
leaf

Drop Variables

# Remove multiple columns from the 'bankrupt' data frame
# Set the columns 'NewIndex', 'HospID', 'Name', 'City', 'State', and 'GeoCode' to NULL

bankrupt$NewIndex <- NULL
bankrupt$HospID <- NULL
bankrupt$Name <- NULL
bankrupt$City <- NULL
bankrupt$State <- NULL
bankrupt$GeoCode <- NULL

Descriptives & Correlations

Descriptives

# Print the rounded summary statistics of the 'bankrupt' data frame
myprint(round(describe(bankrupt, IQR = TRUE, quant = c(.25, .75)), 3))
## <table class=" lightable-classic table" style='font-size: 16px; font-family: "Arial Narrow", "Source Sans Pro", sans-serif; width: auto !important; margin-left: auto; margin-right: auto; font-size: Cambria; margin-left: auto; margin-right: auto;'>
##  <thead>
##   <tr>
##    <th style="text-align:left;">   </th>
##    <th style="text-align:right;"> vars </th>
##    <th style="text-align:right;"> n </th>
##    <th style="text-align:right;"> mean </th>
##    <th style="text-align:right;"> sd </th>
##    <th style="text-align:right;"> median </th>
##    <th style="text-align:right;"> trimmed </th>
##    <th style="text-align:right;"> mad </th>
##    <th style="text-align:right;"> min </th>
##    <th style="text-align:right;"> max </th>
##    <th style="text-align:right;"> range </th>
##    <th style="text-align:right;"> skew </th>
##    <th style="text-align:right;"> kurtosis </th>
##    <th style="text-align:right;"> se </th>
##    <th style="text-align:right;"> IQR </th>
##    <th style="text-align:right;"> Q0.25 </th>
##    <th style="text-align:right;"> Q0.75 </th>
##   </tr>
##  </thead>
## <tbody>
##   <tr>
##    <td style="text-align:left;"> Bankrupt </td>
##    <td style="text-align:right;"> 1 </td>
##    <td style="text-align:right;"> 3091 </td>
##    <td style="text-align:right;"> 2.100000e-02 </td>
##    <td style="text-align:right;"> 1.440000e-01 </td>
##    <td style="text-align:right;"> 0.000 </td>
##    <td style="text-align:right;"> 0.000 </td>
##    <td style="text-align:right;"> 0.000 </td>
##    <td style="text-align:right;"> 0.000000e+00 </td>
##    <td style="text-align:right;"> 1.000000e+00 </td>
##    <td style="text-align:right;"> 1.000000e+00 </td>
##    <td style="text-align:right;"> 6.673 </td>
##    <td style="text-align:right;"> 42.546 </td>
##    <td style="text-align:right;"> 3.000000e-03 </td>
##    <td style="text-align:right;"> 0.000 </td>
##    <td style="text-align:right;"> 0.000 </td>
##    <td style="text-align:right;"> 0.000 </td>
##   </tr>
##   <tr>
##    <td style="text-align:left;"> Year </td>
##    <td style="text-align:right;"> 2 </td>
##    <td style="text-align:right;"> 3091 </td>
##    <td style="text-align:right;"> 2.015272e+03 </td>
##    <td style="text-align:right;"> 3.980000e+00 </td>
##    <td style="text-align:right;"> 2016.000 </td>
##    <td style="text-align:right;"> 2015.375 </td>
##    <td style="text-align:right;"> 4.448 </td>
##    <td style="text-align:right;"> 2.008000e+03 </td>
##    <td style="text-align:right;"> 2.021000e+03 </td>
##    <td style="text-align:right;"> 1.300000e+01 </td>
##    <td style="text-align:right;"> -0.166 </td>
##    <td style="text-align:right;"> -1.222 </td>
##    <td style="text-align:right;"> 7.200000e-02 </td>
##    <td style="text-align:right;"> 7.000 </td>
##    <td style="text-align:right;"> 2012.000 </td>
##    <td style="text-align:right;"> 2019.000 </td>
##   </tr>
##   <tr>
##    <td style="text-align:left;"> AR_by_OpIncome </td>
##    <td style="text-align:right;"> 3 </td>
##    <td style="text-align:right;"> 3091 </td>
##    <td style="text-align:right;"> 3.736000e+00 </td>
##    <td style="text-align:right;"> 2.544000e+00 </td>
##    <td style="text-align:right;"> 4.058 </td>
##    <td style="text-align:right;"> 3.667 </td>
##    <td style="text-align:right;"> 3.271 </td>
##    <td style="text-align:right;"> 3.000000e-03 </td>
##    <td style="text-align:right;"> 8.592000e+00 </td>
##    <td style="text-align:right;"> 8.589000e+00 </td>
##    <td style="text-align:right;"> 0.067 </td>
##    <td style="text-align:right;"> -1.114 </td>
##    <td style="text-align:right;"> 4.600000e-02 </td>
##    <td style="text-align:right;"> 4.324 </td>
##    <td style="text-align:right;"> 1.484 </td>
##    <td style="text-align:right;"> 5.807 </td>
##   </tr>
##   <tr>
##    <td style="text-align:left;"> FB_Plus_OpInc_ByFB </td>
##    <td style="text-align:right;"> 4 </td>
##    <td style="text-align:right;"> 3091 </td>
##    <td style="text-align:right;"> 1.329000e+00 </td>
##    <td style="text-align:right;"> 1.322200e+01 </td>
##    <td style="text-align:right;"> 1.020 </td>
##    <td style="text-align:right;"> 1.018 </td>
##    <td style="text-align:right;"> 0.193 </td>
##    <td style="text-align:right;"> -4.289000e+01 </td>
##    <td style="text-align:right;"> 6.986900e+02 </td>
##    <td style="text-align:right;"> 7.415800e+02 </td>
##    <td style="text-align:right;"> 48.411 </td>
##    <td style="text-align:right;"> 2513.636 </td>
##    <td style="text-align:right;"> 2.380000e-01 </td>
##    <td style="text-align:right;"> 0.260 </td>
##    <td style="text-align:right;"> 0.890 </td>
##    <td style="text-align:right;"> 1.150 </td>
##   </tr>
##   <tr>
##    <td style="text-align:left;"> PercentMedicaidDays </td>
##    <td style="text-align:right;"> 5 </td>
##    <td style="text-align:right;"> 3091 </td>
##    <td style="text-align:right;"> 8.800000e-02 </td>
##    <td style="text-align:right;"> 9.200000e-02 </td>
##    <td style="text-align:right;"> 0.060 </td>
##    <td style="text-align:right;"> 0.071 </td>
##    <td style="text-align:right;"> 0.044 </td>
##    <td style="text-align:right;"> 0.000000e+00 </td>
##    <td style="text-align:right;"> 9.800000e-01 </td>
##    <td style="text-align:right;"> 9.800000e-01 </td>
##    <td style="text-align:right;"> 2.845 </td>
##    <td style="text-align:right;"> 13.222 </td>
##    <td style="text-align:right;"> 2.000000e-03 </td>
##    <td style="text-align:right;"> 0.080 </td>
##    <td style="text-align:right;"> 0.030 </td>
##    <td style="text-align:right;"> 0.110 </td>
##   </tr>
##   <tr>
##    <td style="text-align:left;"> PercentMedicareDays </td>
##    <td style="text-align:right;"> 6 </td>
##    <td style="text-align:right;"> 3091 </td>
##    <td style="text-align:right;"> 3.070000e-01 </td>
##    <td style="text-align:right;"> 1.100000e-01 </td>
##    <td style="text-align:right;"> 0.300 </td>
##    <td style="text-align:right;"> 0.302 </td>
##    <td style="text-align:right;"> 0.104 </td>
##    <td style="text-align:right;"> 0.000000e+00 </td>
##    <td style="text-align:right;"> 8.700000e-01 </td>
##    <td style="text-align:right;"> 8.700000e-01 </td>
##    <td style="text-align:right;"> 0.529 </td>
##    <td style="text-align:right;"> 1.161 </td>
##    <td style="text-align:right;"> 2.000000e-03 </td>
##    <td style="text-align:right;"> 0.130 </td>
##    <td style="text-align:right;"> 0.240 </td>
##    <td style="text-align:right;"> 0.370 </td>
##   </tr>
##   <tr>
##    <td style="text-align:left;"> CurrentRatio </td>
##    <td style="text-align:right;"> 7 </td>
##    <td style="text-align:right;"> 3091 </td>
##    <td style="text-align:right;"> 5.233000e+00 </td>
##    <td style="text-align:right;"> 1.289890e+02 </td>
##    <td style="text-align:right;"> 1.820 </td>
##    <td style="text-align:right;"> 1.994 </td>
##    <td style="text-align:right;"> 1.349 </td>
##    <td style="text-align:right;"> -4.645900e+02 </td>
##    <td style="text-align:right;"> 7.098050e+03 </td>
##    <td style="text-align:right;"> 7.562640e+03 </td>
##    <td style="text-align:right;"> 53.842 </td>
##    <td style="text-align:right;"> 2955.158 </td>
##    <td style="text-align:right;"> 2.320000e+00 </td>
##    <td style="text-align:right;"> 1.885 </td>
##    <td style="text-align:right;"> 1.035 </td>
##    <td style="text-align:right;"> 2.920 </td>
##   </tr>
##   <tr>
##    <td style="text-align:left;"> Debt2Equity </td>
##    <td style="text-align:right;"> 8 </td>
##    <td style="text-align:right;"> 3091 </td>
##    <td style="text-align:right;"> -1.710000e-01 </td>
##    <td style="text-align:right;"> 3.804600e+01 </td>
##    <td style="text-align:right;"> 0.320 </td>
##    <td style="text-align:right;"> 0.377 </td>
##    <td style="text-align:right;"> 0.460 </td>
##    <td style="text-align:right;"> -1.922500e+03 </td>
##    <td style="text-align:right;"> 4.077900e+02 </td>
##    <td style="text-align:right;"> 2.330290e+03 </td>
##    <td style="text-align:right;"> -41.238 </td>
##    <td style="text-align:right;"> 2114.796 </td>
##    <td style="text-align:right;"> 6.840000e-01 </td>
##    <td style="text-align:right;"> 0.750 </td>
##    <td style="text-align:right;"> 0.020 </td>
##    <td style="text-align:right;"> 0.770 </td>
##   </tr>
##   <tr>
##    <td style="text-align:left;"> DaysSalesOutstanding </td>
##    <td style="text-align:right;"> 9 </td>
##    <td style="text-align:right;"> 3091 </td>
##    <td style="text-align:right;"> 5.554500e+01 </td>
##    <td style="text-align:right;"> 1.246630e+02 </td>
##    <td style="text-align:right;"> 48.090 </td>
##    <td style="text-align:right;"> 48.798 </td>
##    <td style="text-align:right;"> 11.801 </td>
##    <td style="text-align:right;"> -1.972370e+03 </td>
##    <td style="text-align:right;"> 4.282780e+03 </td>
##    <td style="text-align:right;"> 6.255150e+03 </td>
##    <td style="text-align:right;"> 16.042 </td>
##    <td style="text-align:right;"> 563.708 </td>
##    <td style="text-align:right;"> 2.242000e+00 </td>
##    <td style="text-align:right;"> 16.220 </td>
##    <td style="text-align:right;"> 40.615 </td>
##    <td style="text-align:right;"> 56.835 </td>
##   </tr>
##   <tr>
##    <td style="text-align:left;"> LaborCompRatio </td>
##    <td style="text-align:right;"> 10 </td>
##    <td style="text-align:right;"> 3091 </td>
##    <td style="text-align:right;"> 4.460000e-01 </td>
##    <td style="text-align:right;"> 1.870000e-01 </td>
##    <td style="text-align:right;"> 0.420 </td>
##    <td style="text-align:right;"> 0.431 </td>
##    <td style="text-align:right;"> 0.119 </td>
##    <td style="text-align:right;"> 1.000000e-02 </td>
##    <td style="text-align:right;"> 6.340000e+00 </td>
##    <td style="text-align:right;"> 6.330000e+00 </td>
##    <td style="text-align:right;"> 11.582 </td>
##    <td style="text-align:right;"> 325.634 </td>
##    <td style="text-align:right;"> 3.000000e-03 </td>
##    <td style="text-align:right;"> 0.170 </td>
##    <td style="text-align:right;"> 0.350 </td>
##    <td style="text-align:right;"> 0.520 </td>
##   </tr>
##   <tr>
##    <td style="text-align:left;"> OpProfitMargin </td>
##    <td style="text-align:right;"> 11 </td>
##    <td style="text-align:right;"> 3091 </td>
##    <td style="text-align:right;"> -3.200000e-02 </td>
##    <td style="text-align:right;"> 3.310000e-01 </td>
##    <td style="text-align:right;"> -0.010 </td>
##    <td style="text-align:right;"> -0.006 </td>
##    <td style="text-align:right;"> 0.119 </td>
##    <td style="text-align:right;"> -1.046000e+01 </td>
##    <td style="text-align:right;"> 8.000000e-01 </td>
##    <td style="text-align:right;"> 1.126000e+01 </td>
##    <td style="text-align:right;"> -15.674 </td>
##    <td style="text-align:right;"> 415.862 </td>
##    <td style="text-align:right;"> 6.000000e-03 </td>
##    <td style="text-align:right;"> 0.150 </td>
##    <td style="text-align:right;"> -0.080 </td>
##    <td style="text-align:right;"> 0.070 </td>
##   </tr>
##   <tr>
##    <td style="text-align:left;"> DaysCashOnHand </td>
##    <td style="text-align:right;"> 12 </td>
##    <td style="text-align:right;"> 3091 </td>
##    <td style="text-align:right;"> 4.967300e+01 </td>
##    <td style="text-align:right;"> 1.372460e+02 </td>
##    <td style="text-align:right;"> 13.550 </td>
##    <td style="text-align:right;"> 27.074 </td>
##    <td style="text-align:right;"> 20.119 </td>
##    <td style="text-align:right;"> -7.541700e+02 </td>
##    <td style="text-align:right;"> 3.060150e+03 </td>
##    <td style="text-align:right;"> 3.814320e+03 </td>
##    <td style="text-align:right;"> 8.684 </td>
##    <td style="text-align:right;"> 126.562 </td>
##    <td style="text-align:right;"> 2.469000e+00 </td>
##    <td style="text-align:right;"> 56.560 </td>
##    <td style="text-align:right;"> 0.160 </td>
##    <td style="text-align:right;"> 56.720 </td>
##   </tr>
##   <tr>
##    <td style="text-align:left;"> BedUtil </td>
##    <td style="text-align:right;"> 13 </td>
##    <td style="text-align:right;"> 3091 </td>
##    <td style="text-align:right;"> 5.050000e-01 </td>
##    <td style="text-align:right;"> 1.950000e-01 </td>
##    <td style="text-align:right;"> 0.520 </td>
##    <td style="text-align:right;"> 0.509 </td>
##    <td style="text-align:right;"> 0.222 </td>
##    <td style="text-align:right;"> 0.000000e+00 </td>
##    <td style="text-align:right;"> 1.000000e+00 </td>
##    <td style="text-align:right;"> 1.000000e+00 </td>
##    <td style="text-align:right;"> -0.167 </td>
##    <td style="text-align:right;"> -0.683 </td>
##    <td style="text-align:right;"> 4.000000e-03 </td>
##    <td style="text-align:right;"> 0.300 </td>
##    <td style="text-align:right;"> 0.360 </td>
##    <td style="text-align:right;"> 0.660 </td>
##   </tr>
##   <tr>
##    <td style="text-align:left;"> AdjPxDays </td>
##    <td style="text-align:right;"> 14 </td>
##    <td style="text-align:right;"> 3091 </td>
##    <td style="text-align:right;"> 9.086000e+00 </td>
##    <td style="text-align:right;"> 1.000100e+01 </td>
##    <td style="text-align:right;"> 6.101 </td>
##    <td style="text-align:right;"> 7.236 </td>
##    <td style="text-align:right;"> 5.812 </td>
##    <td style="text-align:right;"> 0.000000e+00 </td>
##    <td style="text-align:right;"> 1.258170e+02 </td>
##    <td style="text-align:right;"> 1.258160e+02 </td>
##    <td style="text-align:right;"> 3.156 </td>
##    <td style="text-align:right;"> 17.536 </td>
##    <td style="text-align:right;"> 1.800000e-01 </td>
##    <td style="text-align:right;"> 8.993 </td>
##    <td style="text-align:right;"> 2.764 </td>
##    <td style="text-align:right;"> 11.757 </td>
##   </tr>
##   <tr>
##    <td style="text-align:left;"> Alt1Ohls3 </td>
##    <td style="text-align:right;"> 15 </td>
##    <td style="text-align:right;"> 3091 </td>
##    <td style="text-align:right;"> -2.445801e+07 </td>
##    <td style="text-align:right;"> 6.611608e+08 </td>
##    <td style="text-align:right;"> 0.130 </td>
##    <td style="text-align:right;"> 0.147 </td>
##    <td style="text-align:right;"> 0.178 </td>
##    <td style="text-align:right;"> -2.069512e+10 </td>
##    <td style="text-align:right;"> 1.716643e+10 </td>
##    <td style="text-align:right;"> 3.786155e+10 </td>
##    <td style="text-align:right;"> -11.465 </td>
##    <td style="text-align:right;"> 580.816 </td>
##    <td style="text-align:right;"> 1.189207e+07 </td>
##    <td style="text-align:right;"> 0.240 </td>
##    <td style="text-align:right;"> 0.030 </td>
##    <td style="text-align:right;"> 0.270 </td>
##   </tr>
##   <tr>
##    <td style="text-align:left;"> AltmanX2 </td>
##    <td style="text-align:right;"> 16 </td>
##    <td style="text-align:right;"> 3091 </td>
##    <td style="text-align:right;"> -1.594501e+07 </td>
##    <td style="text-align:right;"> 5.424914e+08 </td>
##    <td style="text-align:right;"> 0.030 </td>
##    <td style="text-align:right;"> 0.030 </td>
##    <td style="text-align:right;"> 0.089 </td>
##    <td style="text-align:right;"> -2.401988e+10 </td>
##    <td style="text-align:right;"> 2.003558e+09 </td>
##    <td style="text-align:right;"> 2.602344e+10 </td>
##    <td style="text-align:right;"> -39.065 </td>
##    <td style="text-align:right;"> 1591.579 </td>
##    <td style="text-align:right;"> 9.757607e+06 </td>
##    <td style="text-align:right;"> 0.120 </td>
##    <td style="text-align:right;"> -0.030 </td>
##    <td style="text-align:right;"> 0.090 </td>
##   </tr>
##   <tr>
##    <td style="text-align:left;"> AltmanX3 </td>
##    <td style="text-align:right;"> 17 </td>
##    <td style="text-align:right;"> 3091 </td>
##    <td style="text-align:right;"> -4.899867e+06 </td>
##    <td style="text-align:right;"> 1.415789e+08 </td>
##    <td style="text-align:right;"> 0.050 </td>
##    <td style="text-align:right;"> 0.055 </td>
##    <td style="text-align:right;"> 0.119 </td>
##    <td style="text-align:right;"> -6.057755e+09 </td>
##    <td style="text-align:right;"> 1.405591e+09 </td>
##    <td style="text-align:right;"> 7.463346e+09 </td>
##    <td style="text-align:right;"> -32.437 </td>
##    <td style="text-align:right;"> 1253.232 </td>
##    <td style="text-align:right;"> 2.546531e+06 </td>
##    <td style="text-align:right;"> 0.150 </td>
##    <td style="text-align:right;"> -0.020 </td>
##    <td style="text-align:right;"> 0.130 </td>
##   </tr>
##   <tr>
##    <td style="text-align:left;"> AltmanX4 </td>
##    <td style="text-align:right;"> 18 </td>
##    <td style="text-align:right;"> 3091 </td>
##    <td style="text-align:right;"> 2.670101e+08 </td>
##    <td style="text-align:right;"> 4.532672e+09 </td>
##    <td style="text-align:right;"> 0.070 </td>
##    <td style="text-align:right;"> 0.145 </td>
##    <td style="text-align:right;"> 0.222 </td>
##    <td style="text-align:right;"> -1.500000e+11 </td>
##    <td style="text-align:right;"> 1.520000e+11 </td>
##    <td style="text-align:right;"> 3.020000e+11 </td>
##    <td style="text-align:right;"> 1.192 </td>
##    <td style="text-align:right;"> 809.567 </td>
##    <td style="text-align:right;"> 8.152762e+07 </td>
##    <td style="text-align:right;"> 0.320 </td>
##    <td style="text-align:right;"> -0.050 </td>
##    <td style="text-align:right;"> 0.270 </td>
##   </tr>
##   <tr>
##    <td style="text-align:left;"> OhlsonX1 </td>
##    <td style="text-align:right;"> 19 </td>
##    <td style="text-align:right;"> 3091 </td>
##    <td style="text-align:right;"> 1.204300e+01 </td>
##    <td style="text-align:right;"> 2.186000e+00 </td>
##    <td style="text-align:right;"> 12.180 </td>
##    <td style="text-align:right;"> 12.174 </td>
##    <td style="text-align:right;"> 1.379 </td>
##    <td style="text-align:right;"> -1.115000e+01 </td>
##    <td style="text-align:right;"> 1.724000e+01 </td>
##    <td style="text-align:right;"> 2.839000e+01 </td>
##    <td style="text-align:right;"> -6.164 </td>
##    <td style="text-align:right;"> 63.181 </td>
##    <td style="text-align:right;"> 3.900000e-02 </td>
##    <td style="text-align:right;"> 1.860 </td>
##    <td style="text-align:right;"> 11.250 </td>
##    <td style="text-align:right;"> 13.110 </td>
##   </tr>
##   <tr>
##    <td style="text-align:left;"> OhlsonX2 </td>
##    <td style="text-align:right;"> 20 </td>
##    <td style="text-align:right;"> 3091 </td>
##    <td style="text-align:right;"> -1.117245e+07 </td>
##    <td style="text-align:right;"> 7.414641e+08 </td>
##    <td style="text-align:right;"> 0.450 </td>
##    <td style="text-align:right;"> 0.477 </td>
##    <td style="text-align:right;"> 0.356 </td>
##    <td style="text-align:right;"> -3.619138e+10 </td>
##    <td style="text-align:right;"> 4.035141e+09 </td>
##    <td style="text-align:right;"> 4.022652e+10 </td>
##    <td style="text-align:right;"> -42.416 </td>
##    <td style="text-align:right;"> 1954.265 </td>
##    <td style="text-align:right;"> 1.333646e+07 </td>
##    <td style="text-align:right;"> 0.480 </td>
##    <td style="text-align:right;"> 0.230 </td>
##    <td style="text-align:right;"> 0.710 </td>
##   </tr>
##   <tr>
##    <td style="text-align:left;"> OhlsonX4 </td>
##    <td style="text-align:right;"> 21 </td>
##    <td style="text-align:right;"> 3091 </td>
##    <td style="text-align:right;"> 4.800000e-01 </td>
##    <td style="text-align:right;"> 1.206800e+01 </td>
##    <td style="text-align:right;"> 0.490 </td>
##    <td style="text-align:right;"> 0.571 </td>
##    <td style="text-align:right;"> 0.341 </td>
##    <td style="text-align:right;"> -6.426000e+02 </td>
##    <td style="text-align:right;"> 8.697000e+01 </td>
##    <td style="text-align:right;"> 7.295700e+02 </td>
##    <td style="text-align:right;"> -48.788 </td>
##    <td style="text-align:right;"> 2607.391 </td>
##    <td style="text-align:right;"> 2.170000e-01 </td>
##    <td style="text-align:right;"> 0.525 </td>
##    <td style="text-align:right;"> 0.300 </td>
##    <td style="text-align:right;"> 0.825 </td>
##   </tr>
##   <tr>
##    <td style="text-align:left;"> OhlsonX6 </td>
##    <td style="text-align:right;"> 22 </td>
##    <td style="text-align:right;"> 3091 </td>
##    <td style="text-align:right;"> -6.231568e+06 </td>
##    <td style="text-align:right;"> 2.266328e+08 </td>
##    <td style="text-align:right;"> 0.050 </td>
##    <td style="text-align:right;"> 0.058 </td>
##    <td style="text-align:right;"> 0.089 </td>
##    <td style="text-align:right;"> -1.187764e+10 </td>
##    <td style="text-align:right;"> 2.003558e+09 </td>
##    <td style="text-align:right;"> 1.388120e+10 </td>
##    <td style="text-align:right;"> -46.901 </td>
##    <td style="text-align:right;"> 2440.063 </td>
##    <td style="text-align:right;"> 4.076366e+06 </td>
##    <td style="text-align:right;"> 0.120 </td>
##    <td style="text-align:right;"> 0.000 </td>
##    <td style="text-align:right;"> 0.120 </td>
##   </tr>
##   <tr>
##    <td style="text-align:left;"> OhlsonX7 </td>
##    <td style="text-align:right;"> 23 </td>
##    <td style="text-align:right;"> 3091 </td>
##    <td style="text-align:right;"> 2.863766e+08 </td>
##    <td style="text-align:right;"> 2.552897e+09 </td>
##    <td style="text-align:right;"> 0.100 </td>
##    <td style="text-align:right;"> 0.260 </td>
##    <td style="text-align:right;"> 0.282 </td>
##    <td style="text-align:right;"> -1.000000e+11 </td>
##    <td style="text-align:right;"> 2.906021e+10 </td>
##    <td style="text-align:right;"> 1.290602e+11 </td>
##    <td style="text-align:right;"> -17.419 </td>
##    <td style="text-align:right;"> 787.168 </td>
##    <td style="text-align:right;"> 4.591809e+07 </td>
##    <td style="text-align:right;"> 0.450 </td>
##    <td style="text-align:right;"> -0.040 </td>
##    <td style="text-align:right;"> 0.410 </td>
##   </tr>
##   <tr>
##    <td style="text-align:left;"> OhlsonX9 </td>
##    <td style="text-align:right;"> 24 </td>
##    <td style="text-align:right;"> 3091 </td>
##    <td style="text-align:right;"> 1.145670e+07 </td>
##    <td style="text-align:right;"> 1.251940e+08 </td>
##    <td style="text-align:right;"> 3001155.000 </td>
##    <td style="text-align:right;"> 7700594.968 </td>
##    <td style="text-align:right;"> 13458012.393 </td>
##    <td style="text-align:right;"> -1.778187e+09 </td>
##    <td style="text-align:right;"> 2.986955e+09 </td>
##    <td style="text-align:right;"> 4.765142e+09 </td>
##    <td style="text-align:right;"> 2.781 </td>
##    <td style="text-align:right;"> 166.962 </td>
##    <td style="text-align:right;"> 2.251822e+06 </td>
##    <td style="text-align:right;"> 21045168.000 </td>
##    <td style="text-align:right;"> -2291779.000 </td>
##    <td style="text-align:right;"> 18753389.000 </td>
##   </tr>
##   <tr>
##    <td style="text-align:left;"> OhlsonX5 </td>
##    <td style="text-align:right;"> 25 </td>
##    <td style="text-align:right;"> 3091 </td>
##    <td style="text-align:right;"> 1.900000e-01 </td>
##    <td style="text-align:right;"> 3.920000e-01 </td>
##    <td style="text-align:right;"> 0.000 </td>
##    <td style="text-align:right;"> 0.112 </td>
##    <td style="text-align:right;"> 0.000 </td>
##    <td style="text-align:right;"> 0.000000e+00 </td>
##    <td style="text-align:right;"> 1.000000e+00 </td>
##    <td style="text-align:right;"> 1.000000e+00 </td>
##    <td style="text-align:right;"> 1.580 </td>
##    <td style="text-align:right;"> 0.498 </td>
##    <td style="text-align:right;"> 7.000000e-03 </td>
##    <td style="text-align:right;"> 0.000 </td>
##    <td style="text-align:right;"> 0.000 </td>
##    <td style="text-align:right;"> 0.000 </td>
##   </tr>
##   <tr>
##    <td style="text-align:left;"> OhlsonX8 </td>
##    <td style="text-align:right;"> 26 </td>
##    <td style="text-align:right;"> 3091 </td>
##    <td style="text-align:right;"> 2.590000e-01 </td>
##    <td style="text-align:right;"> 4.380000e-01 </td>
##    <td style="text-align:right;"> 0.000 </td>
##    <td style="text-align:right;"> 0.199 </td>
##    <td style="text-align:right;"> 0.000 </td>
##    <td style="text-align:right;"> 0.000000e+00 </td>
##    <td style="text-align:right;"> 1.000000e+00 </td>
##    <td style="text-align:right;"> 1.000000e+00 </td>
##    <td style="text-align:right;"> 1.099 </td>
##    <td style="text-align:right;"> -0.793 </td>
##    <td style="text-align:right;"> 8.000000e-03 </td>
##    <td style="text-align:right;"> 1.000 </td>
##    <td style="text-align:right;"> 0.000 </td>
##    <td style="text-align:right;"> 1.000 </td>
##   </tr>
##   <tr>
##    <td style="text-align:left;"> Govt </td>
##    <td style="text-align:right;"> 27 </td>
##    <td style="text-align:right;"> 3091 </td>
##    <td style="text-align:right;"> 1.420000e-01 </td>
##    <td style="text-align:right;"> 3.490000e-01 </td>
##    <td style="text-align:right;"> 0.000 </td>
##    <td style="text-align:right;"> 0.053 </td>
##    <td style="text-align:right;"> 0.000 </td>
##    <td style="text-align:right;"> 0.000000e+00 </td>
##    <td style="text-align:right;"> 1.000000e+00 </td>
##    <td style="text-align:right;"> 1.000000e+00 </td>
##    <td style="text-align:right;"> 2.050 </td>
##    <td style="text-align:right;"> 2.203 </td>
##    <td style="text-align:right;"> 6.000000e-03 </td>
##    <td style="text-align:right;"> 0.000 </td>
##    <td style="text-align:right;"> 0.000 </td>
##    <td style="text-align:right;"> 0.000 </td>
##   </tr>
##   <tr>
##    <td style="text-align:left;"> Urban </td>
##    <td style="text-align:right;"> 28 </td>
##    <td style="text-align:right;"> 3091 </td>
##    <td style="text-align:right;"> 1.030000e-01 </td>
##    <td style="text-align:right;"> 3.030000e-01 </td>
##    <td style="text-align:right;"> 0.000 </td>
##    <td style="text-align:right;"> 0.003 </td>
##    <td style="text-align:right;"> 0.000 </td>
##    <td style="text-align:right;"> 0.000000e+00 </td>
##    <td style="text-align:right;"> 1.000000e+00 </td>
##    <td style="text-align:right;"> 1.000000e+00 </td>
##    <td style="text-align:right;"> 2.619 </td>
##    <td style="text-align:right;"> 4.860 </td>
##    <td style="text-align:right;"> 5.000000e-03 </td>
##    <td style="text-align:right;"> 0.000 </td>
##    <td style="text-align:right;"> 0.000 </td>
##    <td style="text-align:right;"> 0.000 </td>
##   </tr>
##   <tr>
##    <td style="text-align:left;"> ForProfit </td>
##    <td style="text-align:right;"> 29 </td>
##    <td style="text-align:right;"> 3091 </td>
##    <td style="text-align:right;"> 2.370000e-01 </td>
##    <td style="text-align:right;"> 4.250000e-01 </td>
##    <td style="text-align:right;"> 0.000 </td>
##    <td style="text-align:right;"> 0.171 </td>
##    <td style="text-align:right;"> 0.000 </td>
##    <td style="text-align:right;"> 0.000000e+00 </td>
##    <td style="text-align:right;"> 1.000000e+00 </td>
##    <td style="text-align:right;"> 1.000000e+00 </td>
##    <td style="text-align:right;"> 1.235 </td>
##    <td style="text-align:right;"> -0.474 </td>
##    <td style="text-align:right;"> 8.000000e-03 </td>
##    <td style="text-align:right;"> 0.000 </td>
##    <td style="text-align:right;"> 0.000 </td>
##    <td style="text-align:right;"> 0.000 </td>
##   </tr>
##   <tr>
##    <td style="text-align:left;"> HC1 </td>
##    <td style="text-align:right;"> 30 </td>
##    <td style="text-align:right;"> 3091 </td>
##    <td style="text-align:right;"> 5.700000e-02 </td>
##    <td style="text-align:right;"> 2.320000e-01 </td>
##    <td style="text-align:right;"> 0.000 </td>
##    <td style="text-align:right;"> 0.000 </td>
##    <td style="text-align:right;"> 0.000 </td>
##    <td style="text-align:right;"> 0.000000e+00 </td>
##    <td style="text-align:right;"> 1.000000e+00 </td>
##    <td style="text-align:right;"> 1.000000e+00 </td>
##    <td style="text-align:right;"> 3.822 </td>
##    <td style="text-align:right;"> 12.613 </td>
##    <td style="text-align:right;"> 4.000000e-03 </td>
##    <td style="text-align:right;"> 0.000 </td>
##    <td style="text-align:right;"> 0.000 </td>
##    <td style="text-align:right;"> 0.000 </td>
##   </tr>
##   <tr>
##    <td style="text-align:left;"> HC2 </td>
##    <td style="text-align:right;"> 31 </td>
##    <td style="text-align:right;"> 3091 </td>
##    <td style="text-align:right;"> 1.970000e-01 </td>
##    <td style="text-align:right;"> 3.980000e-01 </td>
##    <td style="text-align:right;"> 0.000 </td>
##    <td style="text-align:right;"> 0.121 </td>
##    <td style="text-align:right;"> 0.000 </td>
##    <td style="text-align:right;"> 0.000000e+00 </td>
##    <td style="text-align:right;"> 1.000000e+00 </td>
##    <td style="text-align:right;"> 1.000000e+00 </td>
##    <td style="text-align:right;"> 1.525 </td>
##    <td style="text-align:right;"> 0.327 </td>
##    <td style="text-align:right;"> 7.000000e-03 </td>
##    <td style="text-align:right;"> 0.000 </td>
##    <td style="text-align:right;"> 0.000 </td>
##    <td style="text-align:right;"> 0.000 </td>
##   </tr>
##   <tr>
##    <td style="text-align:left;"> HC4 </td>
##    <td style="text-align:right;"> 32 </td>
##    <td style="text-align:right;"> 3091 </td>
##    <td style="text-align:right;"> 2.460000e-01 </td>
##    <td style="text-align:right;"> 4.300000e-01 </td>
##    <td style="text-align:right;"> 0.000 </td>
##    <td style="text-align:right;"> 0.182 </td>
##    <td style="text-align:right;"> 0.000 </td>
##    <td style="text-align:right;"> 0.000000e+00 </td>
##    <td style="text-align:right;"> 1.000000e+00 </td>
##    <td style="text-align:right;"> 1.000000e+00 </td>
##    <td style="text-align:right;"> 1.182 </td>
##    <td style="text-align:right;"> -0.604 </td>
##    <td style="text-align:right;"> 8.000000e-03 </td>
##    <td style="text-align:right;"> 0.000 </td>
##    <td style="text-align:right;"> 0.000 </td>
##    <td style="text-align:right;"> 0.000 </td>
##   </tr>
##   <tr>
##    <td style="text-align:left;"> HC5 </td>
##    <td style="text-align:right;"> 33 </td>
##    <td style="text-align:right;"> 3091 </td>
##    <td style="text-align:right;"> 1.230000e-01 </td>
##    <td style="text-align:right;"> 3.280000e-01 </td>
##    <td style="text-align:right;"> 0.000 </td>
##    <td style="text-align:right;"> 0.028 </td>
##    <td style="text-align:right;"> 0.000 </td>
##    <td style="text-align:right;"> 0.000000e+00 </td>
##    <td style="text-align:right;"> 1.000000e+00 </td>
##    <td style="text-align:right;"> 1.000000e+00 </td>
##    <td style="text-align:right;"> 2.300 </td>
##    <td style="text-align:right;"> 3.291 </td>
##    <td style="text-align:right;"> 6.000000e-03 </td>
##    <td style="text-align:right;"> 0.000 </td>
##    <td style="text-align:right;"> 0.000 </td>
##    <td style="text-align:right;"> 0.000 </td>
##   </tr>
##   <tr>
##    <td style="text-align:left;"> AR_by_OpIncome.y.1. </td>
##    <td style="text-align:right;"> 34 </td>
##    <td style="text-align:right;"> 3091 </td>
##    <td style="text-align:right;"> 3.751000e+00 </td>
##    <td style="text-align:right;"> 2.534000e+00 </td>
##    <td style="text-align:right;"> 4.135 </td>
##    <td style="text-align:right;"> 3.691 </td>
##    <td style="text-align:right;"> 3.176 </td>
##    <td style="text-align:right;"> 2.000000e-03 </td>
##    <td style="text-align:right;"> 8.603000e+00 </td>
##    <td style="text-align:right;"> 8.601000e+00 </td>
##    <td style="text-align:right;"> 0.044 </td>
##    <td style="text-align:right;"> -1.121 </td>
##    <td style="text-align:right;"> 4.600000e-02 </td>
##    <td style="text-align:right;"> 4.310 </td>
##    <td style="text-align:right;"> 1.494 </td>
##    <td style="text-align:right;"> 5.803 </td>
##   </tr>
##   <tr>
##    <td style="text-align:left;"> FB_Plus_OpInc_ByFB.y.1. </td>
##    <td style="text-align:right;"> 35 </td>
##    <td style="text-align:right;"> 3091 </td>
##    <td style="text-align:right;"> 1.753000e+00 </td>
##    <td style="text-align:right;"> 2.970500e+01 </td>
##    <td style="text-align:right;"> 1.020 </td>
##    <td style="text-align:right;"> 1.023 </td>
##    <td style="text-align:right;"> 0.193 </td>
##    <td style="text-align:right;"> -2.297900e+02 </td>
##    <td style="text-align:right;"> 1.378650e+03 </td>
##    <td style="text-align:right;"> 1.608440e+03 </td>
##    <td style="text-align:right;"> 36.382 </td>
##    <td style="text-align:right;"> 1578.776 </td>
##    <td style="text-align:right;"> 5.340000e-01 </td>
##    <td style="text-align:right;"> 0.260 </td>
##    <td style="text-align:right;"> 0.890 </td>
##    <td style="text-align:right;"> 1.150 </td>
##   </tr>
##   <tr>
##    <td style="text-align:left;"> PercentMedicaidDays.y.1. </td>
##    <td style="text-align:right;"> 36 </td>
##    <td style="text-align:right;"> 3091 </td>
##    <td style="text-align:right;"> 8.800000e-02 </td>
##    <td style="text-align:right;"> 9.200000e-02 </td>
##    <td style="text-align:right;"> 0.060 </td>
##    <td style="text-align:right;"> 0.071 </td>
##    <td style="text-align:right;"> 0.044 </td>
##    <td style="text-align:right;"> 0.000000e+00 </td>
##    <td style="text-align:right;"> 9.800000e-01 </td>
##    <td style="text-align:right;"> 9.800000e-01 </td>
##    <td style="text-align:right;"> 2.845 </td>
##    <td style="text-align:right;"> 13.222 </td>
##    <td style="text-align:right;"> 2.000000e-03 </td>
##    <td style="text-align:right;"> 0.080 </td>
##    <td style="text-align:right;"> 0.030 </td>
##    <td style="text-align:right;"> 0.110 </td>
##   </tr>
##   <tr>
##    <td style="text-align:left;"> PercentMedicareDays.y.1. </td>
##    <td style="text-align:right;"> 37 </td>
##    <td style="text-align:right;"> 3091 </td>
##    <td style="text-align:right;"> 3.070000e-01 </td>
##    <td style="text-align:right;"> 1.100000e-01 </td>
##    <td style="text-align:right;"> 0.300 </td>
##    <td style="text-align:right;"> 0.302 </td>
##    <td style="text-align:right;"> 0.104 </td>
##    <td style="text-align:right;"> 0.000000e+00 </td>
##    <td style="text-align:right;"> 8.700000e-01 </td>
##    <td style="text-align:right;"> 8.700000e-01 </td>
##    <td style="text-align:right;"> 0.529 </td>
##    <td style="text-align:right;"> 1.161 </td>
##    <td style="text-align:right;"> 2.000000e-03 </td>
##    <td style="text-align:right;"> 0.130 </td>
##    <td style="text-align:right;"> 0.240 </td>
##    <td style="text-align:right;"> 0.370 </td>
##   </tr>
##   <tr>
##    <td style="text-align:left;"> CurrentRatio.y.1. </td>
##    <td style="text-align:right;"> 38 </td>
##    <td style="text-align:right;"> 3091 </td>
##    <td style="text-align:right;"> 3.142000e+00 </td>
##    <td style="text-align:right;"> 3.442600e+01 </td>
##    <td style="text-align:right;"> 1.880 </td>
##    <td style="text-align:right;"> 2.055 </td>
##    <td style="text-align:right;"> 1.349 </td>
##    <td style="text-align:right;"> -7.873100e+02 </td>
##    <td style="text-align:right;"> 1.482250e+03 </td>
##    <td style="text-align:right;"> 2.269560e+03 </td>
##    <td style="text-align:right;"> 23.815 </td>
##    <td style="text-align:right;"> 1217.626 </td>
##    <td style="text-align:right;"> 6.190000e-01 </td>
##    <td style="text-align:right;"> 1.920 </td>
##    <td style="text-align:right;"> 1.100 </td>
##    <td style="text-align:right;"> 3.020 </td>
##   </tr>
##   <tr>
##    <td style="text-align:left;"> Debt2Equity.y.1. </td>
##    <td style="text-align:right;"> 39 </td>
##    <td style="text-align:right;"> 3091 </td>
##    <td style="text-align:right;"> 2.939000e+00 </td>
##    <td style="text-align:right;"> 1.013940e+02 </td>
##    <td style="text-align:right;"> 0.320 </td>
##    <td style="text-align:right;"> 0.418 </td>
##    <td style="text-align:right;"> 0.474 </td>
##    <td style="text-align:right;"> -6.275700e+02 </td>
##    <td style="text-align:right;"> 4.467920e+03 </td>
##    <td style="text-align:right;"> 5.095490e+03 </td>
##    <td style="text-align:right;"> 35.010 </td>
##    <td style="text-align:right;"> 1386.138 </td>
##    <td style="text-align:right;"> 1.824000e+00 </td>
##    <td style="text-align:right;"> 0.790 </td>
##    <td style="text-align:right;"> 0.020 </td>
##    <td style="text-align:right;"> 0.810 </td>
##   </tr>
##   <tr>
##    <td style="text-align:left;"> DaysSalesOutstanding.y.1. </td>
##    <td style="text-align:right;"> 40 </td>
##    <td style="text-align:right;"> 3091 </td>
##    <td style="text-align:right;"> 5.568200e+01 </td>
##    <td style="text-align:right;"> 1.133490e+02 </td>
##    <td style="text-align:right;"> 48.260 </td>
##    <td style="text-align:right;"> 48.966 </td>
##    <td style="text-align:right;"> 11.920 </td>
##    <td style="text-align:right;"> -1.647780e+03 </td>
##    <td style="text-align:right;"> 3.816810e+03 </td>
##    <td style="text-align:right;"> 5.464590e+03 </td>
##    <td style="text-align:right;"> 16.276 </td>
##    <td style="text-align:right;"> 545.213 </td>
##    <td style="text-align:right;"> 2.039000e+00 </td>
##    <td style="text-align:right;"> 16.200 </td>
##    <td style="text-align:right;"> 40.825 </td>
##    <td style="text-align:right;"> 57.025 </td>
##   </tr>
##   <tr>
##    <td style="text-align:left;"> LaborCompRatio.y.1. </td>
##    <td style="text-align:right;"> 41 </td>
##    <td style="text-align:right;"> 3091 </td>
##    <td style="text-align:right;"> 4.400000e-01 </td>
##    <td style="text-align:right;"> 1.460000e-01 </td>
##    <td style="text-align:right;"> 0.420 </td>
##    <td style="text-align:right;"> 0.428 </td>
##    <td style="text-align:right;"> 0.119 </td>
##    <td style="text-align:right;"> -4.900000e-01 </td>
##    <td style="text-align:right;"> 1.970000e+00 </td>
##    <td style="text-align:right;"> 2.460000e+00 </td>
##    <td style="text-align:right;"> 1.687 </td>
##    <td style="text-align:right;"> 9.918 </td>
##    <td style="text-align:right;"> 3.000000e-03 </td>
##    <td style="text-align:right;"> 0.160 </td>
##    <td style="text-align:right;"> 0.350 </td>
##    <td style="text-align:right;"> 0.510 </td>
##   </tr>
##   <tr>
##    <td style="text-align:left;"> OpProfitMargin.y.1. </td>
##    <td style="text-align:right;"> 42 </td>
##    <td style="text-align:right;"> 3091 </td>
##    <td style="text-align:right;"> -2.400000e-02 </td>
##    <td style="text-align:right;"> 2.600000e-01 </td>
##    <td style="text-align:right;"> 0.000 </td>
##    <td style="text-align:right;"> -0.004 </td>
##    <td style="text-align:right;"> 0.104 </td>
##    <td style="text-align:right;"> -6.890000e+00 </td>
##    <td style="text-align:right;"> 3.420000e+00 </td>
##    <td style="text-align:right;"> 1.031000e+01 </td>
##    <td style="text-align:right;"> -7.537 </td>
##    <td style="text-align:right;"> 180.895 </td>
##    <td style="text-align:right;"> 5.000000e-03 </td>
##    <td style="text-align:right;"> 0.150 </td>
##    <td style="text-align:right;"> -0.080 </td>
##    <td style="text-align:right;"> 0.070 </td>
##   </tr>
##   <tr>
##    <td style="text-align:left;"> DaysCashOnHand.y.1. </td>
##    <td style="text-align:right;"> 43 </td>
##    <td style="text-align:right;"> 3091 </td>
##    <td style="text-align:right;"> 4.773100e+01 </td>
##    <td style="text-align:right;"> 1.286470e+02 </td>
##    <td style="text-align:right;"> 13.420 </td>
##    <td style="text-align:right;"> 26.208 </td>
##    <td style="text-align:right;"> 19.956 </td>
##    <td style="text-align:right;"> -1.292660e+03 </td>
##    <td style="text-align:right;"> 2.814090e+03 </td>
##    <td style="text-align:right;"> 4.106750e+03 </td>
##    <td style="text-align:right;"> 7.217 </td>
##    <td style="text-align:right;"> 111.102 </td>
##    <td style="text-align:right;"> 2.314000e+00 </td>
##    <td style="text-align:right;"> 53.600 </td>
##    <td style="text-align:right;"> 0.160 </td>
##    <td style="text-align:right;"> 53.760 </td>
##   </tr>
##   <tr>
##    <td style="text-align:left;"> BedUtil.y.1. </td>
##    <td style="text-align:right;"> 44 </td>
##    <td style="text-align:right;"> 3091 </td>
##    <td style="text-align:right;"> 5.070000e-01 </td>
##    <td style="text-align:right;"> 1.940000e-01 </td>
##    <td style="text-align:right;"> 0.520 </td>
##    <td style="text-align:right;"> 0.511 </td>
##    <td style="text-align:right;"> 0.208 </td>
##    <td style="text-align:right;"> 0.000000e+00 </td>
##    <td style="text-align:right;"> 1.000000e+00 </td>
##    <td style="text-align:right;"> 1.000000e+00 </td>
##    <td style="text-align:right;"> -0.196 </td>
##    <td style="text-align:right;"> -0.646 </td>
##    <td style="text-align:right;"> 3.000000e-03 </td>
##    <td style="text-align:right;"> 0.290 </td>
##    <td style="text-align:right;"> 0.360 </td>
##    <td style="text-align:right;"> 0.650 </td>
##   </tr>
##   <tr>
##    <td style="text-align:left;"> AdjPxDays.y.1. </td>
##    <td style="text-align:right;"> 45 </td>
##    <td style="text-align:right;"> 3091 </td>
##    <td style="text-align:right;"> 8.918000e+00 </td>
##    <td style="text-align:right;"> 9.802000e+00 </td>
##    <td style="text-align:right;"> 5.984 </td>
##    <td style="text-align:right;"> 7.140 </td>
##    <td style="text-align:right;"> 5.728 </td>
##    <td style="text-align:right;"> 0.000000e+00 </td>
##    <td style="text-align:right;"> 1.415590e+02 </td>
##    <td style="text-align:right;"> 1.415590e+02 </td>
##    <td style="text-align:right;"> 3.393 </td>
##    <td style="text-align:right;"> 22.328 </td>
##    <td style="text-align:right;"> 1.760000e-01 </td>
##    <td style="text-align:right;"> 8.866 </td>
##    <td style="text-align:right;"> 2.772 </td>
##    <td style="text-align:right;"> 11.638 </td>
##   </tr>
##   <tr>
##    <td style="text-align:left;"> Alt1Ohls3.y.1. </td>
##    <td style="text-align:right;"> 46 </td>
##    <td style="text-align:right;"> 3091 </td>
##    <td style="text-align:right;"> -1.830442e+07 </td>
##    <td style="text-align:right;"> 4.335052e+08 </td>
##    <td style="text-align:right;"> 0.140 </td>
##    <td style="text-align:right;"> 0.153 </td>
##    <td style="text-align:right;"> 0.163 </td>
##    <td style="text-align:right;"> -1.393858e+10 </td>
##    <td style="text-align:right;"> 3.015305e+08 </td>
##    <td style="text-align:right;"> 1.424011e+10 </td>
##    <td style="text-align:right;"> -26.671 </td>
##    <td style="text-align:right;"> 751.136 </td>
##    <td style="text-align:right;"> 7.797309e+06 </td>
##    <td style="text-align:right;"> 0.230 </td>
##    <td style="text-align:right;"> 0.040 </td>
##    <td style="text-align:right;"> 0.270 </td>
##   </tr>
##   <tr>
##    <td style="text-align:left;"> AltmanX2.y.1. </td>
##    <td style="text-align:right;"> 47 </td>
##    <td style="text-align:right;"> 3091 </td>
##    <td style="text-align:right;"> -6.227984e+06 </td>
##    <td style="text-align:right;"> 2.560468e+08 </td>
##    <td style="text-align:right;"> 0.030 </td>
##    <td style="text-align:right;"> 0.024 </td>
##    <td style="text-align:right;"> 0.089 </td>
##    <td style="text-align:right;"> -1.398103e+10 </td>
##    <td style="text-align:right;"> 2.097515e+08 </td>
##    <td style="text-align:right;"> 1.419078e+10 </td>
##    <td style="text-align:right;"> -52.811 </td>
##    <td style="text-align:right;"> 2869.188 </td>
##    <td style="text-align:right;"> 4.605427e+06 </td>
##    <td style="text-align:right;"> 0.120 </td>
##    <td style="text-align:right;"> -0.040 </td>
##    <td style="text-align:right;"> 0.080 </td>
##   </tr>
##   <tr>
##    <td style="text-align:left;"> AltmanX3.y.1. </td>
##    <td style="text-align:right;"> 48 </td>
##    <td style="text-align:right;"> 3091 </td>
##    <td style="text-align:right;"> -9.458751e+05 </td>
##    <td style="text-align:right;"> 3.631657e+07 </td>
##    <td style="text-align:right;"> 0.050 </td>
##    <td style="text-align:right;"> 0.057 </td>
##    <td style="text-align:right;"> 0.104 </td>
##    <td style="text-align:right;"> -1.542306e+09 </td>
##    <td style="text-align:right;"> 5.250694e+08 </td>
##    <td style="text-align:right;"> 2.067376e+09 </td>
##    <td style="text-align:right;"> -27.923 </td>
##    <td style="text-align:right;"> 1163.578 </td>
##    <td style="text-align:right;"> 6.532137e+05 </td>
##    <td style="text-align:right;"> 0.140 </td>
##    <td style="text-align:right;"> -0.010 </td>
##    <td style="text-align:right;"> 0.130 </td>
##   </tr>
##   <tr>
##    <td style="text-align:left;"> AltmanX4.y.1. </td>
##    <td style="text-align:right;"> 49 </td>
##    <td style="text-align:right;"> 3091 </td>
##    <td style="text-align:right;"> 2.407713e+08 </td>
##    <td style="text-align:right;"> 1.653409e+09 </td>
##    <td style="text-align:right;"> 0.060 </td>
##    <td style="text-align:right;"> 0.129 </td>
##    <td style="text-align:right;"> 0.222 </td>
##    <td style="text-align:right;"> -2.914540e+10 </td>
##    <td style="text-align:right;"> 2.825674e+10 </td>
##    <td style="text-align:right;"> 5.740214e+10 </td>
##    <td style="text-align:right;"> 4.879 </td>
##    <td style="text-align:right;"> 117.196 </td>
##    <td style="text-align:right;"> 2.973930e+07 </td>
##    <td style="text-align:right;"> 0.305 </td>
##    <td style="text-align:right;"> -0.070 </td>
##    <td style="text-align:right;"> 0.235 </td>
##   </tr>
##   <tr>
##    <td style="text-align:left;"> OhlsonX1.y.1. </td>
##    <td style="text-align:right;"> 50 </td>
##    <td style="text-align:right;"> 3091 </td>
##    <td style="text-align:right;"> 1.204400e+01 </td>
##    <td style="text-align:right;"> 1.922000e+00 </td>
##    <td style="text-align:right;"> 12.160 </td>
##    <td style="text-align:right;"> 12.140 </td>
##    <td style="text-align:right;"> 1.364 </td>
##    <td style="text-align:right;"> -1.115000e+01 </td>
##    <td style="text-align:right;"> 1.712000e+01 </td>
##    <td style="text-align:right;"> 2.827000e+01 </td>
##    <td style="text-align:right;"> -5.697 </td>
##    <td style="text-align:right;"> 66.498 </td>
##    <td style="text-align:right;"> 3.500000e-02 </td>
##    <td style="text-align:right;"> 1.840 </td>
##    <td style="text-align:right;"> 11.230 </td>
##    <td style="text-align:right;"> 13.070 </td>
##   </tr>
##   <tr>
##    <td style="text-align:left;"> OhlsonX2.y.1. </td>
##    <td style="text-align:right;"> 51 </td>
##    <td style="text-align:right;"> 3091 </td>
##    <td style="text-align:right;"> 3.953532e+06 </td>
##    <td style="text-align:right;"> 1.016720e+08 </td>
##    <td style="text-align:right;"> 0.450 </td>
##    <td style="text-align:right;"> 0.478 </td>
##    <td style="text-align:right;"> 0.356 </td>
##    <td style="text-align:right;"> -2.483980e+07 </td>
##    <td style="text-align:right;"> 3.917888e+09 </td>
##    <td style="text-align:right;"> 3.942728e+09 </td>
##    <td style="text-align:right;"> 31.669 </td>
##    <td style="text-align:right;"> 1077.727 </td>
##    <td style="text-align:right;"> 1.828740e+06 </td>
##    <td style="text-align:right;"> 0.470 </td>
##    <td style="text-align:right;"> 0.240 </td>
##    <td style="text-align:right;"> 0.710 </td>
##   </tr>
##   <tr>
##    <td style="text-align:left;"> OhlsonX4.y.1. </td>
##    <td style="text-align:right;"> 52 </td>
##    <td style="text-align:right;"> 3091 </td>
##    <td style="text-align:right;"> 5.580000e-01 </td>
##    <td style="text-align:right;"> 4.706000e+00 </td>
##    <td style="text-align:right;"> 0.490 </td>
##    <td style="text-align:right;"> 0.549 </td>
##    <td style="text-align:right;"> 0.341 </td>
##    <td style="text-align:right;"> -1.835000e+02 </td>
##    <td style="text-align:right;"> 7.136000e+01 </td>
##    <td style="text-align:right;"> 2.548600e+02 </td>
##    <td style="text-align:right;"> -19.581 </td>
##    <td style="text-align:right;"> 814.948 </td>
##    <td style="text-align:right;"> 8.500000e-02 </td>
##    <td style="text-align:right;"> 0.500 </td>
##    <td style="text-align:right;"> 0.290 </td>
##    <td style="text-align:right;"> 0.790 </td>
##   </tr>
##   <tr>
##    <td style="text-align:left;"> OhlsonX6.y.1. </td>
##    <td style="text-align:right;"> 53 </td>
##    <td style="text-align:right;"> 3091 </td>
##    <td style="text-align:right;"> -1.301918e+06 </td>
##    <td style="text-align:right;"> 4.022901e+07 </td>
##    <td style="text-align:right;"> 0.040 </td>
##    <td style="text-align:right;"> 0.052 </td>
##    <td style="text-align:right;"> 0.089 </td>
##    <td style="text-align:right;"> -1.789527e+09 </td>
##    <td style="text-align:right;"> 2.097517e+08 </td>
##    <td style="text-align:right;"> 1.999279e+09 </td>
##    <td style="text-align:right;"> -34.796 </td>
##    <td style="text-align:right;"> 1399.900 </td>
##    <td style="text-align:right;"> 7.235855e+05 </td>
##    <td style="text-align:right;"> 0.120 </td>
##    <td style="text-align:right;"> -0.010 </td>
##    <td style="text-align:right;"> 0.110 </td>
##   </tr>
##   <tr>
##    <td style="text-align:left;"> OhlsonX7.y.1. </td>
##    <td style="text-align:right;"> 54 </td>
##    <td style="text-align:right;"> 3091 </td>
##    <td style="text-align:right;"> 3.029585e+08 </td>
##    <td style="text-align:right;"> 1.706703e+09 </td>
##    <td style="text-align:right;"> 0.100 </td>
##    <td style="text-align:right;"> 0.265 </td>
##    <td style="text-align:right;"> 0.267 </td>
##    <td style="text-align:right;"> -2.396372e+10 </td>
##    <td style="text-align:right;"> 2.558153e+10 </td>
##    <td style="text-align:right;"> 4.954525e+10 </td>
##    <td style="text-align:right;"> 5.912 </td>
##    <td style="text-align:right;"> 76.563 </td>
##    <td style="text-align:right;"> 3.069789e+07 </td>
##    <td style="text-align:right;"> 0.430 </td>
##    <td style="text-align:right;"> -0.030 </td>
##    <td style="text-align:right;"> 0.400 </td>
##   </tr>
##   <tr>
##    <td style="text-align:left;"> OhlsonX9.y.1. </td>
##    <td style="text-align:right;"> 55 </td>
##    <td style="text-align:right;"> 3091 </td>
##    <td style="text-align:right;"> 8.619685e+06 </td>
##    <td style="text-align:right;"> 1.313818e+08 </td>
##    <td style="text-align:right;"> 2774170.000 </td>
##    <td style="text-align:right;"> 6377426.742 </td>
##    <td style="text-align:right;"> 12048694.346 </td>
##    <td style="text-align:right;"> -1.308272e+09 </td>
##    <td style="text-align:right;"> 5.228494e+09 </td>
##    <td style="text-align:right;"> 6.536766e+09 </td>
##    <td style="text-align:right;"> 20.276 </td>
##    <td style="text-align:right;"> 827.469 </td>
##    <td style="text-align:right;"> 2.363120e+06 </td>
##    <td style="text-align:right;"> 18863185.500 </td>
##    <td style="text-align:right;"> -2832161.500 </td>
##    <td style="text-align:right;"> 16031024.000 </td>
##   </tr>
##   <tr>
##    <td style="text-align:left;"> OhlsonX5.y.1. </td>
##    <td style="text-align:right;"> 56 </td>
##    <td style="text-align:right;"> 3091 </td>
##    <td style="text-align:right;"> 1.760000e-01 </td>
##    <td style="text-align:right;"> 3.810000e-01 </td>
##    <td style="text-align:right;"> 0.000 </td>
##    <td style="text-align:right;"> 0.095 </td>
##    <td style="text-align:right;"> 0.000 </td>
##    <td style="text-align:right;"> 0.000000e+00 </td>
##    <td style="text-align:right;"> 1.000000e+00 </td>
##    <td style="text-align:right;"> 1.000000e+00 </td>
##    <td style="text-align:right;"> 1.701 </td>
##    <td style="text-align:right;"> 0.893 </td>
##    <td style="text-align:right;"> 7.000000e-03 </td>
##    <td style="text-align:right;"> 0.000 </td>
##    <td style="text-align:right;"> 0.000 </td>
##    <td style="text-align:right;"> 0.000 </td>
##   </tr>
##   <tr>
##    <td style="text-align:left;"> OhlsonX8.y.1. </td>
##    <td style="text-align:right;"> 57 </td>
##    <td style="text-align:right;"> 3091 </td>
##    <td style="text-align:right;"> 2.670000e-01 </td>
##    <td style="text-align:right;"> 4.420000e-01 </td>
##    <td style="text-align:right;"> 0.000 </td>
##    <td style="text-align:right;"> 0.209 </td>
##    <td style="text-align:right;"> 0.000 </td>
##    <td style="text-align:right;"> 0.000000e+00 </td>
##    <td style="text-align:right;"> 1.000000e+00 </td>
##    <td style="text-align:right;"> 1.000000e+00 </td>
##    <td style="text-align:right;"> 1.053 </td>
##    <td style="text-align:right;"> -0.891 </td>
##    <td style="text-align:right;"> 8.000000e-03 </td>
##    <td style="text-align:right;"> 1.000 </td>
##    <td style="text-align:right;"> 0.000 </td>
##    <td style="text-align:right;"> 1.000 </td>
##   </tr>
##   <tr>
##    <td style="text-align:left;"> HC4_5.y.1. </td>
##    <td style="text-align:right;"> 58 </td>
##    <td style="text-align:right;"> 3091 </td>
##    <td style="text-align:right;"> 3.680000e-01 </td>
##    <td style="text-align:right;"> 4.820000e-01 </td>
##    <td style="text-align:right;"> 0.000 </td>
##    <td style="text-align:right;"> 0.335 </td>
##    <td style="text-align:right;"> 0.000 </td>
##    <td style="text-align:right;"> 0.000000e+00 </td>
##    <td style="text-align:right;"> 1.000000e+00 </td>
##    <td style="text-align:right;"> 1.000000e+00 </td>
##    <td style="text-align:right;"> 0.546 </td>
##    <td style="text-align:right;"> -1.702 </td>
##    <td style="text-align:right;"> 9.000000e-03 </td>
##    <td style="text-align:right;"> 1.000 </td>
##    <td style="text-align:right;"> 0.000 </td>
##    <td style="text-align:right;"> 1.000 </td>
##   </tr>
##   <tr>
##    <td style="text-align:left;"> AR_by_OpIncome.y.2. </td>
##    <td style="text-align:right;"> 59 </td>
##    <td style="text-align:right;"> 3091 </td>
##    <td style="text-align:right;"> 3.881000e+00 </td>
##    <td style="text-align:right;"> 2.543000e+00 </td>
##    <td style="text-align:right;"> 4.315 </td>
##    <td style="text-align:right;"> 3.840 </td>
##    <td style="text-align:right;"> 3.025 </td>
##    <td style="text-align:right;"> 6.000000e-03 </td>
##    <td style="text-align:right;"> 8.604000e+00 </td>
##    <td style="text-align:right;"> 8.598000e+00 </td>
##    <td style="text-align:right;"> 0.006 </td>
##    <td style="text-align:right;"> -1.109 </td>
##    <td style="text-align:right;"> 4.600000e-02 </td>
##    <td style="text-align:right;"> 4.314 </td>
##    <td style="text-align:right;"> 1.529 </td>
##    <td style="text-align:right;"> 5.843 </td>
##   </tr>
##   <tr>
##    <td style="text-align:left;"> FB_Plus_OpInc_ByFB.y.2. </td>
##    <td style="text-align:right;"> 60 </td>
##    <td style="text-align:right;"> 3091 </td>
##    <td style="text-align:right;"> 9.510000e-01 </td>
##    <td style="text-align:right;"> 1.107700e+01 </td>
##    <td style="text-align:right;"> 1.020 </td>
##    <td style="text-align:right;"> 1.021 </td>
##    <td style="text-align:right;"> 0.178 </td>
##    <td style="text-align:right;"> -3.264500e+02 </td>
##    <td style="text-align:right;"> 4.451800e+02 </td>
##    <td style="text-align:right;"> 7.716300e+02 </td>
##    <td style="text-align:right;"> 10.581 </td>
##    <td style="text-align:right;"> 1117.860 </td>
##    <td style="text-align:right;"> 1.990000e-01 </td>
##    <td style="text-align:right;"> 0.240 </td>
##    <td style="text-align:right;"> 0.900 </td>
##    <td style="text-align:right;"> 1.140 </td>
##   </tr>
##   <tr>
##    <td style="text-align:left;"> PercentMedicaidDays.y.2. </td>
##    <td style="text-align:right;"> 61 </td>
##    <td style="text-align:right;"> 3091 </td>
##    <td style="text-align:right;"> 8.800000e-02 </td>
##    <td style="text-align:right;"> 9.200000e-02 </td>
##    <td style="text-align:right;"> 0.060 </td>
##    <td style="text-align:right;"> 0.071 </td>
##    <td style="text-align:right;"> 0.044 </td>
##    <td style="text-align:right;"> 0.000000e+00 </td>
##    <td style="text-align:right;"> 9.800000e-01 </td>
##    <td style="text-align:right;"> 9.800000e-01 </td>
##    <td style="text-align:right;"> 2.845 </td>
##    <td style="text-align:right;"> 13.222 </td>
##    <td style="text-align:right;"> 2.000000e-03 </td>
##    <td style="text-align:right;"> 0.080 </td>
##    <td style="text-align:right;"> 0.030 </td>
##    <td style="text-align:right;"> 0.110 </td>
##   </tr>
##   <tr>
##    <td style="text-align:left;"> PercentMedicareDays.y.2. </td>
##    <td style="text-align:right;"> 62 </td>
##    <td style="text-align:right;"> 3091 </td>
##    <td style="text-align:right;"> 3.070000e-01 </td>
##    <td style="text-align:right;"> 1.100000e-01 </td>
##    <td style="text-align:right;"> 0.300 </td>
##    <td style="text-align:right;"> 0.302 </td>
##    <td style="text-align:right;"> 0.104 </td>
##    <td style="text-align:right;"> 0.000000e+00 </td>
##    <td style="text-align:right;"> 8.700000e-01 </td>
##    <td style="text-align:right;"> 8.700000e-01 </td>
##    <td style="text-align:right;"> 0.529 </td>
##    <td style="text-align:right;"> 1.161 </td>
##    <td style="text-align:right;"> 2.000000e-03 </td>
##    <td style="text-align:right;"> 0.130 </td>
##    <td style="text-align:right;"> 0.240 </td>
##    <td style="text-align:right;"> 0.370 </td>
##   </tr>
##   <tr>
##    <td style="text-align:left;"> CurrentRatio.y.2. </td>
##    <td style="text-align:right;"> 63 </td>
##    <td style="text-align:right;"> 3091 </td>
##    <td style="text-align:right;"> 4.352000e+00 </td>
##    <td style="text-align:right;"> 7.997500e+01 </td>
##    <td style="text-align:right;"> 1.940 </td>
##    <td style="text-align:right;"> 2.127 </td>
##    <td style="text-align:right;"> 1.320 </td>
##    <td style="text-align:right;"> -9.944000e+01 </td>
##    <td style="text-align:right;"> 4.418520e+03 </td>
##    <td style="text-align:right;"> 4.517960e+03 </td>
##    <td style="text-align:right;"> 54.427 </td>
##    <td style="text-align:right;"> 2999.590 </td>
##    <td style="text-align:right;"> 1.438000e+00 </td>
##    <td style="text-align:right;"> 1.850 </td>
##    <td style="text-align:right;"> 1.180 </td>
##    <td style="text-align:right;"> 3.030 </td>
##   </tr>
##   <tr>
##    <td style="text-align:left;"> Debt2Equity.y.2. </td>
##    <td style="text-align:right;"> 64 </td>
##    <td style="text-align:right;"> 3091 </td>
##    <td style="text-align:right;"> -1.009000e+00 </td>
##    <td style="text-align:right;"> 7.720200e+01 </td>
##    <td style="text-align:right;"> 0.320 </td>
##    <td style="text-align:right;"> 0.428 </td>
##    <td style="text-align:right;"> 0.474 </td>
##    <td style="text-align:right;"> -3.255210e+03 </td>
##    <td style="text-align:right;"> 4.554200e+02 </td>
##    <td style="text-align:right;"> 3.710630e+03 </td>
##    <td style="text-align:right;"> -37.668 </td>
##    <td style="text-align:right;"> 1489.002 </td>
##    <td style="text-align:right;"> 1.389000e+00 </td>
##    <td style="text-align:right;"> 0.780 </td>
##    <td style="text-align:right;"> 0.030 </td>
##    <td style="text-align:right;"> 0.810 </td>
##   </tr>
##   <tr>
##    <td style="text-align:left;"> DaysSalesOutstanding.y.2. </td>
##    <td style="text-align:right;"> 65 </td>
##    <td style="text-align:right;"> 3091 </td>
##    <td style="text-align:right;"> 5.619500e+01 </td>
##    <td style="text-align:right;"> 9.183000e+01 </td>
##    <td style="text-align:right;"> 48.960 </td>
##    <td style="text-align:right;"> 49.927 </td>
##    <td style="text-align:right;"> 12.661 </td>
##    <td style="text-align:right;"> -1.931850e+03 </td>
##    <td style="text-align:right;"> 2.455250e+03 </td>
##    <td style="text-align:right;"> 4.387100e+03 </td>
##    <td style="text-align:right;"> 6.539 </td>
##    <td style="text-align:right;"> 336.426 </td>
##    <td style="text-align:right;"> 1.652000e+00 </td>
##    <td style="text-align:right;"> 17.195 </td>
##    <td style="text-align:right;"> 41.055 </td>
##    <td style="text-align:right;"> 58.250 </td>
##   </tr>
##   <tr>
##    <td style="text-align:left;"> LaborCompRatio.y.2. </td>
##    <td style="text-align:right;"> 66 </td>
##    <td style="text-align:right;"> 3091 </td>
##    <td style="text-align:right;"> 4.370000e-01 </td>
##    <td style="text-align:right;"> 1.650000e-01 </td>
##    <td style="text-align:right;"> 0.420 </td>
##    <td style="text-align:right;"> 0.425 </td>
##    <td style="text-align:right;"> 0.119 </td>
##    <td style="text-align:right;"> -1.990000e+00 </td>
##    <td style="text-align:right;"> 4.580000e+00 </td>
##    <td style="text-align:right;"> 6.570000e+00 </td>
##    <td style="text-align:right;"> 5.217 </td>
##    <td style="text-align:right;"> 147.834 </td>
##    <td style="text-align:right;"> 3.000000e-03 </td>
##    <td style="text-align:right;"> 0.150 </td>
##    <td style="text-align:right;"> 0.350 </td>
##    <td style="text-align:right;"> 0.500 </td>
##   </tr>
##   <tr>
##    <td style="text-align:left;"> OpProfitMargin.y.2. </td>
##    <td style="text-align:right;"> 67 </td>
##    <td style="text-align:right;"> 3091 </td>
##    <td style="text-align:right;"> -2.300000e-02 </td>
##    <td style="text-align:right;"> 3.190000e-01 </td>
##    <td style="text-align:right;"> 0.000 </td>
##    <td style="text-align:right;"> -0.001 </td>
##    <td style="text-align:right;"> 0.104 </td>
##    <td style="text-align:right;"> -9.570000e+00 </td>
##    <td style="text-align:right;"> 8.190000e+00 </td>
##    <td style="text-align:right;"> 1.776000e+01 </td>
##    <td style="text-align:right;"> -4.515 </td>
##    <td style="text-align:right;"> 407.074 </td>
##    <td style="text-align:right;"> 6.000000e-03 </td>
##    <td style="text-align:right;"> 0.140 </td>
##    <td style="text-align:right;"> -0.070 </td>
##    <td style="text-align:right;"> 0.070 </td>
##   </tr>
##   <tr>
##    <td style="text-align:left;"> DaysCashOnHand.y.2. </td>
##    <td style="text-align:right;"> 68 </td>
##    <td style="text-align:right;"> 3091 </td>
##    <td style="text-align:right;"> 4.358000e+01 </td>
##    <td style="text-align:right;"> 1.194100e+02 </td>
##    <td style="text-align:right;"> 12.980 </td>
##    <td style="text-align:right;"> 24.336 </td>
##    <td style="text-align:right;"> 19.244 </td>
##    <td style="text-align:right;"> -1.576700e+03 </td>
##    <td style="text-align:right;"> 2.385800e+03 </td>
##    <td style="text-align:right;"> 3.962500e+03 </td>
##    <td style="text-align:right;"> 6.072 </td>
##    <td style="text-align:right;"> 98.138 </td>
##    <td style="text-align:right;"> 2.148000e+00 </td>
##    <td style="text-align:right;"> 48.970 </td>
##    <td style="text-align:right;"> 0.150 </td>
##    <td style="text-align:right;"> 49.120 </td>
##   </tr>
##   <tr>
##    <td style="text-align:left;"> BedUtil.y.2. </td>
##    <td style="text-align:right;"> 69 </td>
##    <td style="text-align:right;"> 3091 </td>
##    <td style="text-align:right;"> 5.100000e-01 </td>
##    <td style="text-align:right;"> 1.920000e-01 </td>
##    <td style="text-align:right;"> 0.520 </td>
##    <td style="text-align:right;"> 0.515 </td>
##    <td style="text-align:right;"> 0.208 </td>
##    <td style="text-align:right;"> 0.000000e+00 </td>
##    <td style="text-align:right;"> 1.000000e+00 </td>
##    <td style="text-align:right;"> 1.000000e+00 </td>
##    <td style="text-align:right;"> -0.205 </td>
##    <td style="text-align:right;"> -0.591 </td>
##    <td style="text-align:right;"> 3.000000e-03 </td>
##    <td style="text-align:right;"> 0.290 </td>
##    <td style="text-align:right;"> 0.370 </td>
##    <td style="text-align:right;"> 0.660 </td>
##   </tr>
##   <tr>
##    <td style="text-align:left;"> AdjPxDays.y.2. </td>
##    <td style="text-align:right;"> 70 </td>
##    <td style="text-align:right;"> 3091 </td>
##    <td style="text-align:right;"> 8.814000e+00 </td>
##    <td style="text-align:right;"> 9.624000e+00 </td>
##    <td style="text-align:right;"> 5.905 </td>
##    <td style="text-align:right;"> 7.083 </td>
##    <td style="text-align:right;"> 5.541 </td>
##    <td style="text-align:right;"> 0.000000e+00 </td>
##    <td style="text-align:right;"> 1.372550e+02 </td>
##    <td style="text-align:right;"> 1.372550e+02 </td>
##    <td style="text-align:right;"> 3.417 </td>
##    <td style="text-align:right;"> 22.603 </td>
##    <td style="text-align:right;"> 1.730000e-01 </td>
##    <td style="text-align:right;"> 8.741 </td>
##    <td style="text-align:right;"> 2.797 </td>
##    <td style="text-align:right;"> 11.538 </td>
##   </tr>
##   <tr>
##    <td style="text-align:left;"> Alt1Ohls3.y.2. </td>
##    <td style="text-align:right;"> 71 </td>
##    <td style="text-align:right;"> 3091 </td>
##    <td style="text-align:right;"> -2.216925e+07 </td>
##    <td style="text-align:right;"> 4.377270e+08 </td>
##    <td style="text-align:right;"> 0.140 </td>
##    <td style="text-align:right;"> 0.156 </td>
##    <td style="text-align:right;"> 0.163 </td>
##    <td style="text-align:right;"> -1.303108e+10 </td>
##    <td style="text-align:right;"> 1.546664e+09 </td>
##    <td style="text-align:right;"> 1.457774e+10 </td>
##    <td style="text-align:right;"> -23.201 </td>
##    <td style="text-align:right;"> 590.735 </td>
##    <td style="text-align:right;"> 7.873246e+06 </td>
##    <td style="text-align:right;"> 0.220 </td>
##    <td style="text-align:right;"> 0.050 </td>
##    <td style="text-align:right;"> 0.270 </td>
##   </tr>
##   <tr>
##    <td style="text-align:left;"> AltmanX2.y.2. </td>
##    <td style="text-align:right;"> 72 </td>
##    <td style="text-align:right;"> 3091 </td>
##    <td style="text-align:right;"> -4.075977e+07 </td>
##    <td style="text-align:right;"> 1.380976e+09 </td>
##    <td style="text-align:right;"> 0.020 </td>
##    <td style="text-align:right;"> 0.025 </td>
##    <td style="text-align:right;"> 0.074 </td>
##    <td style="text-align:right;"> -5.695970e+10 </td>
##    <td style="text-align:right;"> 1.100960e+09 </td>
##    <td style="text-align:right;"> 5.806066e+10 </td>
##    <td style="text-align:right;"> -37.286 </td>
##    <td style="text-align:right;"> 1432.076 </td>
##    <td style="text-align:right;"> 2.483914e+07 </td>
##    <td style="text-align:right;"> 0.110 </td>
##    <td style="text-align:right;"> -0.030 </td>
##    <td style="text-align:right;"> 0.080 </td>
##   </tr>
##   <tr>
##    <td style="text-align:left;"> AltmanX3.y.2. </td>
##    <td style="text-align:right;"> 73 </td>
##    <td style="text-align:right;"> 3091 </td>
##    <td style="text-align:right;"> -5.964158e+05 </td>
##    <td style="text-align:right;"> 1.231702e+08 </td>
##    <td style="text-align:right;"> 0.050 </td>
##    <td style="text-align:right;"> 0.060 </td>
##    <td style="text-align:right;"> 0.104 </td>
##    <td style="text-align:right;"> -3.464660e+09 </td>
##    <td style="text-align:right;"> 4.765823e+09 </td>
##    <td style="text-align:right;"> 8.230483e+09 </td>
##    <td style="text-align:right;"> 9.279 </td>
##    <td style="text-align:right;"> 980.994 </td>
##    <td style="text-align:right;"> 2.215421e+06 </td>
##    <td style="text-align:right;"> 0.140 </td>
##    <td style="text-align:right;"> -0.010 </td>
##    <td style="text-align:right;"> 0.130 </td>
##   </tr>
##   <tr>
##    <td style="text-align:left;"> AltmanX4.y.2. </td>
##    <td style="text-align:right;"> 74 </td>
##    <td style="text-align:right;"> 3091 </td>
##    <td style="text-align:right;"> 1.854853e+08 </td>
##    <td style="text-align:right;"> 3.993410e+09 </td>
##    <td style="text-align:right;"> 0.040 </td>
##    <td style="text-align:right;"> 0.117 </td>
##    <td style="text-align:right;"> 0.193 </td>
##    <td style="text-align:right;"> -1.540000e+11 </td>
##    <td style="text-align:right;"> 1.140000e+11 </td>
##    <td style="text-align:right;"> 2.680000e+11 </td>
##    <td style="text-align:right;"> -12.378 </td>
##    <td style="text-align:right;"> 959.078 </td>
##    <td style="text-align:right;"> 7.182810e+07 </td>
##    <td style="text-align:right;"> 0.280 </td>
##    <td style="text-align:right;"> -0.050 </td>
##    <td style="text-align:right;"> 0.230 </td>
##   </tr>
##   <tr>
##    <td style="text-align:left;"> OhlsonX1.y.2. </td>
##    <td style="text-align:right;"> 75 </td>
##    <td style="text-align:right;"> 3091 </td>
##    <td style="text-align:right;"> 1.197000e+01 </td>
##    <td style="text-align:right;"> 2.162000e+00 </td>
##    <td style="text-align:right;"> 12.130 </td>
##    <td style="text-align:right;"> 12.108 </td>
##    <td style="text-align:right;"> 1.334 </td>
##    <td style="text-align:right;"> -1.115000e+01 </td>
##    <td style="text-align:right;"> 1.700000e+01 </td>
##    <td style="text-align:right;"> 2.815000e+01 </td>
##    <td style="text-align:right;"> -6.307 </td>
##    <td style="text-align:right;"> 65.182 </td>
##    <td style="text-align:right;"> 3.900000e-02 </td>
##    <td style="text-align:right;"> 1.800 </td>
##    <td style="text-align:right;"> 11.220 </td>
##    <td style="text-align:right;"> 13.020 </td>
##   </tr>
##   <tr>
##    <td style="text-align:left;"> OhlsonX2.y.2. </td>
##    <td style="text-align:right;"> 76 </td>
##    <td style="text-align:right;"> 3091 </td>
##    <td style="text-align:right;"> 9.217425e+06 </td>
##    <td style="text-align:right;"> 1.881989e+08 </td>
##    <td style="text-align:right;"> 0.450 </td>
##    <td style="text-align:right;"> 0.472 </td>
##    <td style="text-align:right;"> 0.356 </td>
##    <td style="text-align:right;"> -6.485320e+07 </td>
##    <td style="text-align:right;"> 6.737484e+09 </td>
##    <td style="text-align:right;"> 6.802337e+09 </td>
##    <td style="text-align:right;"> 26.401 </td>
##    <td style="text-align:right;"> 784.742 </td>
##    <td style="text-align:right;"> 3.385069e+06 </td>
##    <td style="text-align:right;"> 0.480 </td>
##    <td style="text-align:right;"> 0.230 </td>
##    <td style="text-align:right;"> 0.710 </td>
##   </tr>
##   <tr>
##    <td style="text-align:left;"> OhlsonX4.y.2. </td>
##    <td style="text-align:right;"> 77 </td>
##    <td style="text-align:right;"> 3091 </td>
##    <td style="text-align:right;"> 1.072000e+00 </td>
##    <td style="text-align:right;"> 3.029800e+01 </td>
##    <td style="text-align:right;"> 0.470 </td>
##    <td style="text-align:right;"> 0.527 </td>
##    <td style="text-align:right;"> 0.311 </td>
##    <td style="text-align:right;"> -9.859000e+01 </td>
##    <td style="text-align:right;"> 1.675990e+03 </td>
##    <td style="text-align:right;"> 1.774580e+03 </td>
##    <td style="text-align:right;"> 54.639 </td>
##    <td style="text-align:right;"> 3018.398 </td>
##    <td style="text-align:right;"> 5.450000e-01 </td>
##    <td style="text-align:right;"> 0.460 </td>
##    <td style="text-align:right;"> 0.290 </td>
##    <td style="text-align:right;"> 0.750 </td>
##   </tr>
##   <tr>
##    <td style="text-align:left;"> OhlsonX6.y.2. </td>
##    <td style="text-align:right;"> 78 </td>
##    <td style="text-align:right;"> 3091 </td>
##    <td style="text-align:right;"> 3.688414e+06 </td>
##    <td style="text-align:right;"> 3.693899e+08 </td>
##    <td style="text-align:right;"> 0.040 </td>
##    <td style="text-align:right;"> 0.047 </td>
##    <td style="text-align:right;"> 0.089 </td>
##    <td style="text-align:right;"> -2.700965e+09 </td>
##    <td style="text-align:right;"> 1.998557e+10 </td>
##    <td style="text-align:right;"> 2.268653e+10 </td>
##    <td style="text-align:right;"> 50.894 </td>
##    <td style="text-align:right;"> 2769.439 </td>
##    <td style="text-align:right;"> 6.644089e+06 </td>
##    <td style="text-align:right;"> 0.110 </td>
##    <td style="text-align:right;"> -0.010 </td>
##    <td style="text-align:right;"> 0.100 </td>
##   </tr>
##   <tr>
##    <td style="text-align:left;"> OhlsonX7.y.2. </td>
##    <td style="text-align:right;"> 79 </td>
##    <td style="text-align:right;"> 3091 </td>
##    <td style="text-align:right;"> 3.005484e+08 </td>
##    <td style="text-align:right;"> 1.759180e+09 </td>
##    <td style="text-align:right;"> 0.110 </td>
##    <td style="text-align:right;"> 0.258 </td>
##    <td style="text-align:right;"> 0.252 </td>
##    <td style="text-align:right;"> -2.319753e+10 </td>
##    <td style="text-align:right;"> 3.100398e+10 </td>
##    <td style="text-align:right;"> 5.420151e+10 </td>
##    <td style="text-align:right;"> 6.630 </td>
##    <td style="text-align:right;"> 90.840 </td>
##    <td style="text-align:right;"> 3.164177e+07 </td>
##    <td style="text-align:right;"> 0.410 </td>
##    <td style="text-align:right;"> -0.020 </td>
##    <td style="text-align:right;"> 0.390 </td>
##   </tr>
##   <tr>
##    <td style="text-align:left;"> OhlsonX9.y.2. </td>
##    <td style="text-align:right;"> 80 </td>
##    <td style="text-align:right;"> 3091 </td>
##    <td style="text-align:right;"> 1.491405e+07 </td>
##    <td style="text-align:right;"> 1.706167e+08 </td>
##    <td style="text-align:right;"> 1826434.000 </td>
##    <td style="text-align:right;"> 6194854.729 </td>
##    <td style="text-align:right;"> 10289278.100 </td>
##    <td style="text-align:right;"> -1.539479e+09 </td>
##    <td style="text-align:right;"> 5.228494e+09 </td>
##    <td style="text-align:right;"> 6.767973e+09 </td>
##    <td style="text-align:right;"> 21.354 </td>
##    <td style="text-align:right;"> 610.942 </td>
##    <td style="text-align:right;"> 3.068824e+06 </td>
##    <td style="text-align:right;"> 16565951.000 </td>
##    <td style="text-align:right;"> -1868869.500 </td>
##    <td style="text-align:right;"> 14697081.500 </td>
##   </tr>
##   <tr>
##    <td style="text-align:left;"> OhlsonX5.y.2. </td>
##    <td style="text-align:right;"> 81 </td>
##    <td style="text-align:right;"> 3091 </td>
##    <td style="text-align:right;"> 1.680000e-01 </td>
##    <td style="text-align:right;"> 3.740000e-01 </td>
##    <td style="text-align:right;"> 0.000 </td>
##    <td style="text-align:right;"> 0.085 </td>
##    <td style="text-align:right;"> 0.000 </td>
##    <td style="text-align:right;"> 0.000000e+00 </td>
##    <td style="text-align:right;"> 1.000000e+00 </td>
##    <td style="text-align:right;"> 1.000000e+00 </td>
##    <td style="text-align:right;"> 1.779 </td>
##    <td style="text-align:right;"> 1.166 </td>
##    <td style="text-align:right;"> 7.000000e-03 </td>
##    <td style="text-align:right;"> 0.000 </td>
##    <td style="text-align:right;"> 0.000 </td>
##    <td style="text-align:right;"> 0.000 </td>
##   </tr>
##   <tr>
##    <td style="text-align:left;"> OhlsonX8.y.2. </td>
##    <td style="text-align:right;"> 82 </td>
##    <td style="text-align:right;"> 3091 </td>
##    <td style="text-align:right;"> 2.720000e-01 </td>
##    <td style="text-align:right;"> 4.450000e-01 </td>
##    <td style="text-align:right;"> 0.000 </td>
##    <td style="text-align:right;"> 0.216 </td>
##    <td style="text-align:right;"> 0.000 </td>
##    <td style="text-align:right;"> 0.000000e+00 </td>
##    <td style="text-align:right;"> 1.000000e+00 </td>
##    <td style="text-align:right;"> 1.000000e+00 </td>
##    <td style="text-align:right;"> 1.022 </td>
##    <td style="text-align:right;"> -0.956 </td>
##    <td style="text-align:right;"> 8.000000e-03 </td>
##    <td style="text-align:right;"> 1.000 </td>
##    <td style="text-align:right;"> 0.000 </td>
##    <td style="text-align:right;"> 1.000 </td>
##   </tr>
##   <tr>
##    <td style="text-align:left;"> D_AR_by_OpIncome </td>
##    <td style="text-align:right;"> 83 </td>
##    <td style="text-align:right;"> 3091 </td>
##    <td style="text-align:right;"> 2.147000e+00 </td>
##    <td style="text-align:right;"> 2.429100e+01 </td>
##    <td style="text-align:right;"> 0.000 </td>
##    <td style="text-align:right;"> 0.094 </td>
##    <td style="text-align:right;"> 0.469 </td>
##    <td style="text-align:right;"> -9.990000e-01 </td>
##    <td style="text-align:right;"> 1.245000e+03 </td>
##    <td style="text-align:right;"> 1.245999e+03 </td>
##    <td style="text-align:right;"> 44.014 </td>
##    <td style="text-align:right;"> 2218.637 </td>
##    <td style="text-align:right;"> 4.370000e-01 </td>
##    <td style="text-align:right;"> 0.664 </td>
##    <td style="text-align:right;"> -0.286 </td>
##    <td style="text-align:right;"> 0.378 </td>
##   </tr>
##   <tr>
##    <td style="text-align:left;"> D_FB_Plus_OpInc_ByFB </td>
##    <td style="text-align:right;"> 84 </td>
##    <td style="text-align:right;"> 3091 </td>
##    <td style="text-align:right;"> 5.800000e-02 </td>
##    <td style="text-align:right;"> 2.314200e+01 </td>
##    <td style="text-align:right;"> -0.010 </td>
##    <td style="text-align:right;"> -0.032 </td>
##    <td style="text-align:right;"> 0.110 </td>
##    <td style="text-align:right;"> -9.690000e+02 </td>
##    <td style="text-align:right;"> 6.228300e+02 </td>
##    <td style="text-align:right;"> 1.591830e+03 </td>
##    <td style="text-align:right;"> -14.938 </td>
##    <td style="text-align:right;"> 1206.914 </td>
##    <td style="text-align:right;"> 4.160000e-01 </td>
##    <td style="text-align:right;"> 0.153 </td>
##    <td style="text-align:right;"> -0.104 </td>
##    <td style="text-align:right;"> 0.049 </td>
##   </tr>
##   <tr>
##    <td style="text-align:left;"> D_CurrentRatio </td>
##    <td style="text-align:right;"> 85 </td>
##    <td style="text-align:right;"> 3091 </td>
##    <td style="text-align:right;"> -1.720000e-01 </td>
##    <td style="text-align:right;"> 4.018000e+00 </td>
##    <td style="text-align:right;"> -0.021 </td>
##    <td style="text-align:right;"> -0.026 </td>
##    <td style="text-align:right;"> 0.286 </td>
##    <td style="text-align:right;"> -1.260770e+02 </td>
##    <td style="text-align:right;"> 2.300000e+01 </td>
##    <td style="text-align:right;"> 1.490770e+02 </td>
##    <td style="text-align:right;"> -22.667 </td>
##    <td style="text-align:right;"> 639.671 </td>
##    <td style="text-align:right;"> 7.200000e-02 </td>
##    <td style="text-align:right;"> 0.385 </td>
##    <td style="text-align:right;"> -0.224 </td>
##    <td style="text-align:right;"> 0.161 </td>
##   </tr>
##   <tr>
##    <td style="text-align:left;"> D_Debt2Equity </td>
##    <td style="text-align:right;"> 86 </td>
##    <td style="text-align:right;"> 3091 </td>
##    <td style="text-align:right;"> -8.800000e-02 </td>
##    <td style="text-align:right;"> 2.020300e+01 </td>
##    <td style="text-align:right;"> -0.029 </td>
##    <td style="text-align:right;"> -0.061 </td>
##    <td style="text-align:right;"> 0.266 </td>
##    <td style="text-align:right;"> -7.519770e+02 </td>
##    <td style="text-align:right;"> 3.553750e+02 </td>
##    <td style="text-align:right;"> 1.107352e+03 </td>
##    <td style="text-align:right;"> -21.848 </td>
##    <td style="text-align:right;"> 817.458 </td>
##    <td style="text-align:right;"> 3.630000e-01 </td>
##    <td style="text-align:right;"> 0.350 </td>
##    <td style="text-align:right;"> -0.250 </td>
##    <td style="text-align:right;"> 0.100 </td>
##   </tr>
##   <tr>
##    <td style="text-align:left;"> D_LiabFundBalRatio </td>
##    <td style="text-align:right;"> 87 </td>
##    <td style="text-align:right;"> 3091 </td>
##    <td style="text-align:right;"> -7.000000e-01 </td>
##    <td style="text-align:right;"> 2.943700e+01 </td>
##    <td style="text-align:right;"> -0.031 </td>
##    <td style="text-align:right;"> -0.029 </td>
##    <td style="text-align:right;"> 0.289 </td>
##    <td style="text-align:right;"> -1.422188e+03 </td>
##    <td style="text-align:right;"> 1.197140e+02 </td>
##    <td style="text-align:right;"> 1.541902e+03 </td>
##    <td style="text-align:right;"> -42.309 </td>
##    <td style="text-align:right;"> 1910.528 </td>
##    <td style="text-align:right;"> 5.290000e-01 </td>
##    <td style="text-align:right;"> 0.389 </td>
##    <td style="text-align:right;"> -0.227 </td>
##    <td style="text-align:right;"> 0.162 </td>
##   </tr>
##   <tr>
##    <td style="text-align:left;"> D_DaysSalesOutstanding </td>
##    <td style="text-align:right;"> 88 </td>
##    <td style="text-align:right;"> 3091 </td>
##    <td style="text-align:right;"> -1.397000e+00 </td>
##    <td style="text-align:right;"> 8.311500e+01 </td>
##    <td style="text-align:right;"> -0.006 </td>
##    <td style="text-align:right;"> -0.001 </td>
##    <td style="text-align:right;"> 0.157 </td>
##    <td style="text-align:right;"> -4.557000e+03 </td>
##    <td style="text-align:right;"> 5.583750e+02 </td>
##    <td style="text-align:right;"> 5.115375e+03 </td>
##    <td style="text-align:right;"> -53.251 </td>
##    <td style="text-align:right;"> 2918.070 </td>
##    <td style="text-align:right;"> 1.495000e+00 </td>
##    <td style="text-align:right;"> 0.216 </td>
##    <td style="text-align:right;"> -0.109 </td>
##    <td style="text-align:right;"> 0.107 </td>
##   </tr>
##   <tr>
##    <td style="text-align:left;"> D_LaborCompRatio </td>
##    <td style="text-align:right;"> 89 </td>
##    <td style="text-align:right;"> 3091 </td>
##    <td style="text-align:right;"> 1.900000e-02 </td>
##    <td style="text-align:right;"> 3.500000e-01 </td>
##    <td style="text-align:right;"> 0.000 </td>
##    <td style="text-align:right;"> 0.004 </td>
##    <td style="text-align:right;"> 0.074 </td>
##    <td style="text-align:right;"> -5.667000e+00 </td>
##    <td style="text-align:right;"> 1.500000e+01 </td>
##    <td style="text-align:right;"> 2.066700e+01 </td>
##    <td style="text-align:right;"> 25.792 </td>
##    <td style="text-align:right;"> 1124.819 </td>
##    <td style="text-align:right;"> 6.000000e-03 </td>
##    <td style="text-align:right;"> 0.100 </td>
##    <td style="text-align:right;"> -0.048 </td>
##    <td style="text-align:right;"> 0.053 </td>
##   </tr>
##   <tr>
##    <td style="text-align:left;"> D_OpProfitMargin </td>
##    <td style="text-align:right;"> 90 </td>
##    <td style="text-align:right;"> 3091 </td>
##    <td style="text-align:right;"> -2.000000e-01 </td>
##    <td style="text-align:right;"> 3.771000e+00 </td>
##    <td style="text-align:right;"> -0.067 </td>
##    <td style="text-align:right;"> -0.118 </td>
##    <td style="text-align:right;"> 0.717 </td>
##    <td style="text-align:right;"> -1.010000e+02 </td>
##    <td style="text-align:right;"> 7.800000e+01 </td>
##    <td style="text-align:right;"> 1.790000e+02 </td>
##    <td style="text-align:right;"> -5.920 </td>
##    <td style="text-align:right;"> 279.914 </td>
##    <td style="text-align:right;"> 6.800000e-02 </td>
##    <td style="text-align:right;"> 0.960 </td>
##    <td style="text-align:right;"> -0.626 </td>
##    <td style="text-align:right;"> 0.333 </td>
##   </tr>
##   <tr>
##    <td style="text-align:left;"> D_DaysCashOnHand </td>
##    <td style="text-align:right;"> 91 </td>
##    <td style="text-align:right;"> 3091 </td>
##    <td style="text-align:right;"> 7.341000e+00 </td>
##    <td style="text-align:right;"> 4.284620e+02 </td>
##    <td style="text-align:right;"> 0.000 </td>
##    <td style="text-align:right;"> 0.036 </td>
##    <td style="text-align:right;"> 0.582 </td>
##    <td style="text-align:right;"> -1.522800e+04 </td>
##    <td style="text-align:right;"> 1.694500e+04 </td>
##    <td style="text-align:right;"> 3.217300e+04 </td>
##    <td style="text-align:right;"> 6.062 </td>
##    <td style="text-align:right;"> 1309.824 </td>
##    <td style="text-align:right;"> 7.707000e+00 </td>
##    <td style="text-align:right;"> 0.784 </td>
##    <td style="text-align:right;"> -0.400 </td>
##    <td style="text-align:right;"> 0.384 </td>
##   </tr>
##   <tr>
##    <td style="text-align:left;"> D_BedUtil </td>
##    <td style="text-align:right;"> 92 </td>
##    <td style="text-align:right;"> 3091 </td>
##    <td style="text-align:right;"> 2.800000e-02 </td>
##    <td style="text-align:right;"> 9.820000e-01 </td>
##    <td style="text-align:right;"> 0.000 </td>
##    <td style="text-align:right;"> -0.008 </td>
##    <td style="text-align:right;"> 0.089 </td>
##    <td style="text-align:right;"> -1.000000e+00 </td>
##    <td style="text-align:right;"> 5.300000e+01 </td>
##    <td style="text-align:right;"> 5.400000e+01 </td>
##    <td style="text-align:right;"> 50.921 </td>
##    <td style="text-align:right;"> 2735.060 </td>
##    <td style="text-align:right;"> 1.800000e-02 </td>
##    <td style="text-align:right;"> 0.120 </td>
##    <td style="text-align:right;"> -0.070 </td>
##    <td style="text-align:right;"> 0.050 </td>
##   </tr>
##   <tr>
##    <td style="text-align:left;"> D_AdjPxDays </td>
##    <td style="text-align:right;"> 93 </td>
##    <td style="text-align:right;"> 3091 </td>
##    <td style="text-align:right;"> 1.902300e+01 </td>
##    <td style="text-align:right;"> 1.054974e+03 </td>
##    <td style="text-align:right;"> 0.010 </td>
##    <td style="text-align:right;"> 0.011 </td>
##    <td style="text-align:right;"> 0.077 </td>
##    <td style="text-align:right;"> -9.460000e-01 </td>
##    <td style="text-align:right;"> 5.865315e+04 </td>
##    <td style="text-align:right;"> 5.865410e+04 </td>
##    <td style="text-align:right;"> 55.543 </td>
##    <td style="text-align:right;"> 3083.996 </td>
##    <td style="text-align:right;"> 1.897500e+01 </td>
##    <td style="text-align:right;"> 0.104 </td>
##    <td style="text-align:right;"> -0.041 </td>
##    <td style="text-align:right;"> 0.063 </td>
##   </tr>
##   <tr>
##    <td style="text-align:left;"> D_Alt1Ohls3 </td>
##    <td style="text-align:right;"> 94 </td>
##    <td style="text-align:right;"> 3091 </td>
##    <td style="text-align:right;"> -3.046744e+07 </td>
##    <td style="text-align:right;"> 1.630871e+09 </td>
##    <td style="text-align:right;"> 0.000 </td>
##    <td style="text-align:right;"> -0.038 </td>
##    <td style="text-align:right;"> 0.404 </td>
##    <td style="text-align:right;"> -8.997879e+10 </td>
##    <td style="text-align:right;"> 3.052270e+09 </td>
##    <td style="text-align:right;"> 9.303106e+10 </td>
##    <td style="text-align:right;"> -54.340 </td>
##    <td style="text-align:right;"> 2990.993 </td>
##    <td style="text-align:right;"> 2.933391e+07 </td>
##    <td style="text-align:right;"> 0.564 </td>
##    <td style="text-align:right;"> -0.333 </td>
##    <td style="text-align:right;"> 0.230 </td>
##   </tr>
##   <tr>
##    <td style="text-align:left;"> D_AltmanX2 </td>
##    <td style="text-align:right;"> 95 </td>
##    <td style="text-align:right;"> 3091 </td>
##    <td style="text-align:right;"> 3.211872e+07 </td>
##    <td style="text-align:right;"> 1.371175e+09 </td>
##    <td style="text-align:right;"> -0.500 </td>
##    <td style="text-align:right;"> -0.544 </td>
##    <td style="text-align:right;"> 1.235 </td>
##    <td style="text-align:right;"> -1.708382e+08 </td>
##    <td style="text-align:right;"> 7.506213e+10 </td>
##    <td style="text-align:right;"> 7.523297e+10 </td>
##    <td style="text-align:right;"> 53.239 </td>
##    <td style="text-align:right;"> 2899.451 </td>
##    <td style="text-align:right;"> 2.466286e+07 </td>
##    <td style="text-align:right;"> 1.678 </td>
##    <td style="text-align:right;"> -1.378 </td>
##    <td style="text-align:right;"> 0.300 </td>
##   </tr>
##   <tr>
##    <td style="text-align:left;"> D_AltmanX3 </td>
##    <td style="text-align:right;"> 96 </td>
##    <td style="text-align:right;"> 3091 </td>
##    <td style="text-align:right;"> 2.412699e+07 </td>
##    <td style="text-align:right;"> 8.252692e+08 </td>
##    <td style="text-align:right;"> -0.071 </td>
##    <td style="text-align:right;"> -0.109 </td>
##    <td style="text-align:right;"> 0.635 </td>
##    <td style="text-align:right;"> -1.539000e+03 </td>
##    <td style="text-align:right;"> 3.406117e+10 </td>
##    <td style="text-align:right;"> 3.406117e+10 </td>
##    <td style="text-align:right;"> 38.717 </td>
##    <td style="text-align:right;"> 1518.599 </td>
##    <td style="text-align:right;"> 1.484384e+07 </td>
##    <td style="text-align:right;"> 0.889 </td>
##    <td style="text-align:right;"> -0.556 </td>
##    <td style="text-align:right;"> 0.333 </td>
##   </tr>
##   <tr>
##    <td style="text-align:left;"> D_AltmanX4 </td>
##    <td style="text-align:right;"> 97 </td>
##    <td style="text-align:right;"> 3091 </td>
##    <td style="text-align:right;"> -1.201230e+09 </td>
##    <td style="text-align:right;"> 5.318602e+10 </td>
##    <td style="text-align:right;"> -0.550 </td>
##    <td style="text-align:right;"> -0.541 </td>
##    <td style="text-align:right;"> 1.260 </td>
##    <td style="text-align:right;"> -2.750000e+12 </td>
##    <td style="text-align:right;"> 4.500000e+11 </td>
##    <td style="text-align:right;"> 3.200000e+12 </td>
##    <td style="text-align:right;"> -46.277 </td>
##    <td style="text-align:right;"> 2338.273 </td>
##    <td style="text-align:right;"> 9.566387e+08 </td>
##    <td style="text-align:right;"> 1.708 </td>
##    <td style="text-align:right;"> -1.375 </td>
##    <td style="text-align:right;"> 0.333 </td>
##   </tr>
##   <tr>
##    <td style="text-align:left;"> D_OhlsonX1 </td>
##    <td style="text-align:right;"> 98 </td>
##    <td style="text-align:right;"> 3091 </td>
##    <td style="text-align:right;"> -6.000000e-03 </td>
##    <td style="text-align:right;"> 1.470000e-01 </td>
##    <td style="text-align:right;"> 0.003 </td>
##    <td style="text-align:right;"> 0.003 </td>
##    <td style="text-align:right;"> 0.008 </td>
##    <td style="text-align:right;"> -2.310000e+00 </td>
##    <td style="text-align:right;"> 1.307000e+00 </td>
##    <td style="text-align:right;"> 3.617000e+00 </td>
##    <td style="text-align:right;"> -12.742 </td>
##    <td style="text-align:right;"> 187.861 </td>
##    <td style="text-align:right;"> 3.000000e-03 </td>
##    <td style="text-align:right;"> 0.010 </td>
##    <td style="text-align:right;"> -0.002 </td>
##    <td style="text-align:right;"> 0.008 </td>
##   </tr>
##   <tr>
##    <td style="text-align:left;"> D_OhlsonX2 </td>
##    <td style="text-align:right;"> 99 </td>
##    <td style="text-align:right;"> 3091 </td>
##    <td style="text-align:right;"> -1.881033e+06 </td>
##    <td style="text-align:right;"> 1.072912e+09 </td>
##    <td style="text-align:right;"> 0.000 </td>
##    <td style="text-align:right;"> 0.007 </td>
##    <td style="text-align:right;"> 0.156 </td>
##    <td style="text-align:right;"> -5.097377e+10 </td>
##    <td style="text-align:right;"> 2.615652e+10 </td>
##    <td style="text-align:right;"> 7.713030e+10 </td>
##    <td style="text-align:right;"> -28.892 </td>
##    <td style="text-align:right;"> 1776.106 </td>
##    <td style="text-align:right;"> 1.929810e+07 </td>
##    <td style="text-align:right;"> 0.215 </td>
##    <td style="text-align:right;"> -0.100 </td>
##    <td style="text-align:right;"> 0.115 </td>
##   </tr>
##   <tr>
##    <td style="text-align:left;"> D_OhlsonX4 </td>
##    <td style="text-align:right;"> 100 </td>
##    <td style="text-align:right;"> 3091 </td>
##    <td style="text-align:right;"> 1.250000e-01 </td>
##    <td style="text-align:right;"> 3.979000e+00 </td>
##    <td style="text-align:right;"> 0.000 </td>
##    <td style="text-align:right;"> 0.035 </td>
##    <td style="text-align:right;"> 0.292 </td>
##    <td style="text-align:right;"> -1.045000e+02 </td>
##    <td style="text-align:right;"> 1.050000e+02 </td>
##    <td style="text-align:right;"> 2.095000e+02 </td>
##    <td style="text-align:right;"> 1.264 </td>
##    <td style="text-align:right;"> 378.637 </td>
##    <td style="text-align:right;"> 7.200000e-02 </td>
##    <td style="text-align:right;"> 0.406 </td>
##    <td style="text-align:right;"> -0.171 </td>
##    <td style="text-align:right;"> 0.235 </td>
##   </tr>
##   <tr>
##    <td style="text-align:left;"> D_OhlsonX6 </td>
##    <td style="text-align:right;"> 101 </td>
##    <td style="text-align:right;"> 3091 </td>
##    <td style="text-align:right;"> 2.513597e+07 </td>
##    <td style="text-align:right;"> 1.013776e+09 </td>
##    <td style="text-align:right;"> -0.133 </td>
##    <td style="text-align:right;"> -0.137 </td>
##    <td style="text-align:right;"> 0.939 </td>
##    <td style="text-align:right;"> -8.772930e+03 </td>
##    <td style="text-align:right;"> 5.543998e+10 </td>
##    <td style="text-align:right;"> 5.543999e+10 </td>
##    <td style="text-align:right;"> 53.043 </td>
##    <td style="text-align:right;"> 2886.754 </td>
##    <td style="text-align:right;"> 1.823444e+07 </td>
##    <td style="text-align:right;"> 1.229 </td>
##    <td style="text-align:right;"> -0.800 </td>
##    <td style="text-align:right;"> 0.429 </td>
##   </tr>
##   <tr>
##    <td style="text-align:left;"> D_OhlsonX7 </td>
##    <td style="text-align:right;"> 102 </td>
##    <td style="text-align:right;"> 3091 </td>
##    <td style="text-align:right;"> 1.468682e+08 </td>
##    <td style="text-align:right;"> 4.177040e+09 </td>
##    <td style="text-align:right;"> -0.077 </td>
##    <td style="text-align:right;"> -0.083 </td>
##    <td style="text-align:right;"> 0.762 </td>
##    <td style="text-align:right;"> -5.342444e+10 </td>
##    <td style="text-align:right;"> 1.700000e+11 </td>
##    <td style="text-align:right;"> 2.234244e+11 </td>
##    <td style="text-align:right;"> 32.083 </td>
##    <td style="text-align:right;"> 1226.407 </td>
##    <td style="text-align:right;"> 7.513100e+07 </td>
##    <td style="text-align:right;"> 1.018 </td>
##    <td style="text-align:right;"> -0.636 </td>
##    <td style="text-align:right;"> 0.382 </td>
##   </tr>
##   <tr>
##    <td style="text-align:left;"> D_OhlsonX9 </td>
##    <td style="text-align:right;"> 103 </td>
##    <td style="text-align:right;"> 3091 </td>
##    <td style="text-align:right;"> 8.777139e+05 </td>
##    <td style="text-align:right;"> 4.184137e+07 </td>
##    <td style="text-align:right;"> -0.504 </td>
##    <td style="text-align:right;"> -0.555 </td>
##    <td style="text-align:right;"> 1.335 </td>
##    <td style="text-align:right;"> -3.247753e+08 </td>
##    <td style="text-align:right;"> 2.107294e+09 </td>
##    <td style="text-align:right;"> 2.432069e+09 </td>
##    <td style="text-align:right;"> 44.674 </td>
##    <td style="text-align:right;"> 2155.070 </td>
##    <td style="text-align:right;"> 7.525864e+05 </td>
##    <td style="text-align:right;"> 1.799 </td>
##    <td style="text-align:right;"> -1.440 </td>
##    <td style="text-align:right;"> 0.359 </td>
##   </tr>
##   <tr>
##    <td style="text-align:left;"> NegLiab.y.1. </td>
##    <td style="text-align:right;"> 104 </td>
##    <td style="text-align:right;"> 3091 </td>
##    <td style="text-align:right;"> 7.500000e-02 </td>
##    <td style="text-align:right;"> 2.640000e-01 </td>
##    <td style="text-align:right;"> 0.000 </td>
##    <td style="text-align:right;"> 0.000 </td>
##    <td style="text-align:right;"> 0.000 </td>
##    <td style="text-align:right;"> 0.000000e+00 </td>
##    <td style="text-align:right;"> 1.000000e+00 </td>
##    <td style="text-align:right;"> 1.000000e+00 </td>
##    <td style="text-align:right;"> 3.215 </td>
##    <td style="text-align:right;"> 8.340 </td>
##    <td style="text-align:right;"> 5.000000e-03 </td>
##    <td style="text-align:right;"> 0.000 </td>
##    <td style="text-align:right;"> 0.000 </td>
##    <td style="text-align:right;"> 0.000 </td>
##   </tr>
##   <tr>
##    <td style="text-align:left;"> NegLiab.y.2. </td>
##    <td style="text-align:right;"> 105 </td>
##    <td style="text-align:right;"> 3091 </td>
##    <td style="text-align:right;"> 7.700000e-02 </td>
##    <td style="text-align:right;"> 2.670000e-01 </td>
##    <td style="text-align:right;"> 0.000 </td>
##    <td style="text-align:right;"> 0.000 </td>
##    <td style="text-align:right;"> 0.000 </td>
##    <td style="text-align:right;"> 0.000000e+00 </td>
##    <td style="text-align:right;"> 1.000000e+00 </td>
##    <td style="text-align:right;"> 1.000000e+00 </td>
##    <td style="text-align:right;"> 3.163 </td>
##    <td style="text-align:right;"> 8.010 </td>
##    <td style="text-align:right;"> 5.000000e-03 </td>
##    <td style="text-align:right;"> 0.000 </td>
##    <td style="text-align:right;"> 0.000 </td>
##    <td style="text-align:right;"> 0.000 </td>
##   </tr>
## </tbody>
## </table>
# Print the rounded summary statistics of the subset of 'bankrupt' data frame
myprint(round(describe(bankrupt[bankrupt$Bankrupt == 1,], IQR = TRUE, quant = c(.25, .75)), 3))
## <table class=" lightable-classic table" style='font-size: 16px; font-family: "Arial Narrow", "Source Sans Pro", sans-serif; width: auto !important; margin-left: auto; margin-right: auto; font-size: Cambria; margin-left: auto; margin-right: auto;'>
##  <thead>
##   <tr>
##    <th style="text-align:left;">   </th>
##    <th style="text-align:right;"> vars </th>
##    <th style="text-align:right;"> n </th>
##    <th style="text-align:right;"> mean </th>
##    <th style="text-align:right;"> sd </th>
##    <th style="text-align:right;"> median </th>
##    <th style="text-align:right;"> trimmed </th>
##    <th style="text-align:right;"> mad </th>
##    <th style="text-align:right;"> min </th>
##    <th style="text-align:right;"> max </th>
##    <th style="text-align:right;"> range </th>
##    <th style="text-align:right;"> skew </th>
##    <th style="text-align:right;"> kurtosis </th>
##    <th style="text-align:right;"> se </th>
##    <th style="text-align:right;"> IQR </th>
##    <th style="text-align:right;"> Q0.25 </th>
##    <th style="text-align:right;"> Q0.75 </th>
##   </tr>
##  </thead>
## <tbody>
##   <tr>
##    <td style="text-align:left;"> Bankrupt </td>
##    <td style="text-align:right;"> 1 </td>
##    <td style="text-align:right;"> 65 </td>
##    <td style="text-align:right;"> 1.000000e+00 </td>
##    <td style="text-align:right;"> 0.000000e+00 </td>
##    <td style="text-align:right;"> 1.000 </td>
##    <td style="text-align:right;"> 1.000 </td>
##    <td style="text-align:right;"> 0.000 </td>
##    <td style="text-align:right;"> 1.000000e+00 </td>
##    <td style="text-align:right;"> 1.000000e+00 </td>
##    <td style="text-align:right;"> 0.000000e+00 </td>
##    <td style="text-align:right;"> NaN </td>
##    <td style="text-align:right;"> NaN </td>
##    <td style="text-align:right;"> 0.000000e+00 </td>
##    <td style="text-align:right;"> 0.000 </td>
##    <td style="text-align:right;"> 1.000 </td>
##    <td style="text-align:right;"> 1.000 </td>
##   </tr>
##   <tr>
##    <td style="text-align:left;"> Year </td>
##    <td style="text-align:right;"> 2 </td>
##    <td style="text-align:right;"> 65 </td>
##    <td style="text-align:right;"> 2.015585e+03 </td>
##    <td style="text-align:right;"> 3.259000e+00 </td>
##    <td style="text-align:right;"> 2017.000 </td>
##    <td style="text-align:right;"> 2015.925 </td>
##    <td style="text-align:right;"> 2.965 </td>
##    <td style="text-align:right;"> 2.008000e+03 </td>
##    <td style="text-align:right;"> 2.020000e+03 </td>
##    <td style="text-align:right;"> 1.200000e+01 </td>
##    <td style="text-align:right;"> -0.855 </td>
##    <td style="text-align:right;"> -0.574 </td>
##    <td style="text-align:right;"> 4.040000e-01 </td>
##    <td style="text-align:right;"> 4.000 </td>
##    <td style="text-align:right;"> 2014.000 </td>
##    <td style="text-align:right;"> 2018.000 </td>
##   </tr>
##   <tr>
##    <td style="text-align:left;"> AR_by_OpIncome </td>
##    <td style="text-align:right;"> 3 </td>
##    <td style="text-align:right;"> 65 </td>
##    <td style="text-align:right;"> 2.384000e+00 </td>
##    <td style="text-align:right;"> 2.383000e+00 </td>
##    <td style="text-align:right;"> 1.522 </td>
##    <td style="text-align:right;"> 2.058 </td>
##    <td style="text-align:right;"> 2.098 </td>
##    <td style="text-align:right;"> 1.700000e-02 </td>
##    <td style="text-align:right;"> 8.529000e+00 </td>
##    <td style="text-align:right;"> 8.512000e+00 </td>
##    <td style="text-align:right;"> 0.974 </td>
##    <td style="text-align:right;"> 0.058 </td>
##    <td style="text-align:right;"> 2.960000e-01 </td>
##    <td style="text-align:right;"> 3.181 </td>
##    <td style="text-align:right;"> 0.158 </td>
##    <td style="text-align:right;"> 3.339 </td>
##   </tr>
##   <tr>
##    <td style="text-align:left;"> FB_Plus_OpInc_ByFB </td>
##    <td style="text-align:right;"> 4 </td>
##    <td style="text-align:right;"> 65 </td>
##    <td style="text-align:right;"> 1.215700e+01 </td>
##    <td style="text-align:right;"> 8.650500e+01 </td>
##    <td style="text-align:right;"> 1.120 </td>
##    <td style="text-align:right;"> 1.161 </td>
##    <td style="text-align:right;"> 0.489 </td>
##    <td style="text-align:right;"> -1.250000e+00 </td>
##    <td style="text-align:right;"> 6.986900e+02 </td>
##    <td style="text-align:right;"> 6.999400e+02 </td>
##    <td style="text-align:right;"> 7.688 </td>
##    <td style="text-align:right;"> 58.034 </td>
##    <td style="text-align:right;"> 1.073000e+01 </td>
##    <td style="text-align:right;"> 0.480 </td>
##    <td style="text-align:right;"> 0.780 </td>
##    <td style="text-align:right;"> 1.260 </td>
##   </tr>
##   <tr>
##    <td style="text-align:left;"> PercentMedicaidDays </td>
##    <td style="text-align:right;"> 5 </td>
##    <td style="text-align:right;"> 65 </td>
##    <td style="text-align:right;"> 1.030000e-01 </td>
##    <td style="text-align:right;"> 1.070000e-01 </td>
##    <td style="text-align:right;"> 0.060 </td>
##    <td style="text-align:right;"> 0.084 </td>
##    <td style="text-align:right;"> 0.059 </td>
##    <td style="text-align:right;"> 1.000000e-02 </td>
##    <td style="text-align:right;"> 4.500000e-01 </td>
##    <td style="text-align:right;"> 4.400000e-01 </td>
##    <td style="text-align:right;"> 1.687 </td>
##    <td style="text-align:right;"> 2.402 </td>
##    <td style="text-align:right;"> 1.300000e-02 </td>
##    <td style="text-align:right;"> 0.110 </td>
##    <td style="text-align:right;"> 0.030 </td>
##    <td style="text-align:right;"> 0.140 </td>
##   </tr>
##   <tr>
##    <td style="text-align:left;"> PercentMedicareDays </td>
##    <td style="text-align:right;"> 6 </td>
##    <td style="text-align:right;"> 65 </td>
##    <td style="text-align:right;"> 3.250000e-01 </td>
##    <td style="text-align:right;"> 1.330000e-01 </td>
##    <td style="text-align:right;"> 0.300 </td>
##    <td style="text-align:right;"> 0.316 </td>
##    <td style="text-align:right;"> 0.104 </td>
##    <td style="text-align:right;"> 6.000000e-02 </td>
##    <td style="text-align:right;"> 7.800000e-01 </td>
##    <td style="text-align:right;"> 7.200000e-01 </td>
##    <td style="text-align:right;"> 0.812 </td>
##    <td style="text-align:right;"> 0.855 </td>
##    <td style="text-align:right;"> 1.600000e-02 </td>
##    <td style="text-align:right;"> 0.150 </td>
##    <td style="text-align:right;"> 0.240 </td>
##    <td style="text-align:right;"> 0.390 </td>
##   </tr>
##   <tr>
##    <td style="text-align:left;"> CurrentRatio </td>
##    <td style="text-align:right;"> 7 </td>
##    <td style="text-align:right;"> 65 </td>
##    <td style="text-align:right;"> 3.600000e-01 </td>
##    <td style="text-align:right;"> 2.504000e+00 </td>
##    <td style="text-align:right;"> 0.560 </td>
##    <td style="text-align:right;"> 0.692 </td>
##    <td style="text-align:right;"> 0.845 </td>
##    <td style="text-align:right;"> -1.310000e+01 </td>
##    <td style="text-align:right;"> 3.920000e+00 </td>
##    <td style="text-align:right;"> 1.702000e+01 </td>
##    <td style="text-align:right;"> -3.285 </td>
##    <td style="text-align:right;"> 14.085 </td>
##    <td style="text-align:right;"> 3.110000e-01 </td>
##    <td style="text-align:right;"> 1.190 </td>
##    <td style="text-align:right;"> 0.230 </td>
##    <td style="text-align:right;"> 1.420 </td>
##   </tr>
##   <tr>
##    <td style="text-align:left;"> Debt2Equity </td>
##    <td style="text-align:right;"> 8 </td>
##    <td style="text-align:right;"> 65 </td>
##    <td style="text-align:right;"> -3.077600e+01 </td>
##    <td style="text-align:right;"> 2.384260e+02 </td>
##    <td style="text-align:right;"> 0.090 </td>
##    <td style="text-align:right;"> -0.156 </td>
##    <td style="text-align:right;"> 0.756 </td>
##    <td style="text-align:right;"> -1.922500e+03 </td>
##    <td style="text-align:right;"> 7.330000e+00 </td>
##    <td style="text-align:right;"> 1.929830e+03 </td>
##    <td style="text-align:right;"> -7.682 </td>
##    <td style="text-align:right;"> 57.969 </td>
##    <td style="text-align:right;"> 2.957300e+01 </td>
##    <td style="text-align:right;"> 1.200 </td>
##    <td style="text-align:right;"> -0.800 </td>
##    <td style="text-align:right;"> 0.400 </td>
##   </tr>
##   <tr>
##    <td style="text-align:left;"> DaysSalesOutstanding </td>
##    <td style="text-align:right;"> 9 </td>
##    <td style="text-align:right;"> 65 </td>
##    <td style="text-align:right;"> 5.600200e+01 </td>
##    <td style="text-align:right;"> 4.989800e+01 </td>
##    <td style="text-align:right;"> 52.600 </td>
##    <td style="text-align:right;"> 55.040 </td>
##    <td style="text-align:right;"> 20.845 </td>
##    <td style="text-align:right;"> -2.131200e+02 </td>
##    <td style="text-align:right;"> 2.356500e+02 </td>
##    <td style="text-align:right;"> 4.487700e+02 </td>
##    <td style="text-align:right;"> -1.549 </td>
##    <td style="text-align:right;"> 13.493 </td>
##    <td style="text-align:right;"> 6.189000e+00 </td>
##    <td style="text-align:right;"> 28.870 </td>
##    <td style="text-align:right;"> 41.440 </td>
##    <td style="text-align:right;"> 70.310 </td>
##   </tr>
##   <tr>
##    <td style="text-align:left;"> LaborCompRatio </td>
##    <td style="text-align:right;"> 10 </td>
##    <td style="text-align:right;"> 65 </td>
##    <td style="text-align:right;"> 5.840000e-01 </td>
##    <td style="text-align:right;"> 7.420000e-01 </td>
##    <td style="text-align:right;"> 0.490 </td>
##    <td style="text-align:right;"> 0.487 </td>
##    <td style="text-align:right;"> 0.178 </td>
##    <td style="text-align:right;"> 2.100000e-01 </td>
##    <td style="text-align:right;"> 6.340000e+00 </td>
##    <td style="text-align:right;"> 6.130000e+00 </td>
##    <td style="text-align:right;"> 7.166 </td>
##    <td style="text-align:right;"> 52.683 </td>
##    <td style="text-align:right;"> 9.200000e-02 </td>
##    <td style="text-align:right;"> 0.230 </td>
##    <td style="text-align:right;"> 0.360 </td>
##    <td style="text-align:right;"> 0.590 </td>
##   </tr>
##   <tr>
##    <td style="text-align:left;"> OpProfitMargin </td>
##    <td style="text-align:right;"> 11 </td>
##    <td style="text-align:right;"> 65 </td>
##    <td style="text-align:right;"> -2.680000e-01 </td>
##    <td style="text-align:right;"> 1.299000e+00 </td>
##    <td style="text-align:right;"> -0.100 </td>
##    <td style="text-align:right;"> -0.102 </td>
##    <td style="text-align:right;"> 0.148 </td>
##    <td style="text-align:right;"> -1.046000e+01 </td>
##    <td style="text-align:right;"> 3.700000e-01 </td>
##    <td style="text-align:right;"> 1.083000e+01 </td>
##    <td style="text-align:right;"> -7.416 </td>
##    <td style="text-align:right;"> 55.227 </td>
##    <td style="text-align:right;"> 1.610000e-01 </td>
##    <td style="text-align:right;"> 0.200 </td>
##    <td style="text-align:right;"> -0.210 </td>
##    <td style="text-align:right;"> -0.010 </td>
##   </tr>
##   <tr>
##    <td style="text-align:left;"> DaysCashOnHand </td>
##    <td style="text-align:right;"> 12 </td>
##    <td style="text-align:right;"> 65 </td>
##    <td style="text-align:right;"> 1.210600e+01 </td>
##    <td style="text-align:right;"> 2.236300e+01 </td>
##    <td style="text-align:right;"> 2.580 </td>
##    <td style="text-align:right;"> 8.056 </td>
##    <td style="text-align:right;"> 10.779 </td>
##    <td style="text-align:right;"> -1.477000e+01 </td>
##    <td style="text-align:right;"> 9.730000e+01 </td>
##    <td style="text-align:right;"> 1.120700e+02 </td>
##    <td style="text-align:right;"> 1.809 </td>
##    <td style="text-align:right;"> 3.116 </td>
##    <td style="text-align:right;"> 2.774000e+00 </td>
##    <td style="text-align:right;"> 20.810 </td>
##    <td style="text-align:right;"> -1.520 </td>
##    <td style="text-align:right;"> 19.290 </td>
##   </tr>
##   <tr>
##    <td style="text-align:left;"> BedUtil </td>
##    <td style="text-align:right;"> 13 </td>
##    <td style="text-align:right;"> 65 </td>
##    <td style="text-align:right;"> 3.510000e-01 </td>
##    <td style="text-align:right;"> 1.780000e-01 </td>
##    <td style="text-align:right;"> 0.290 </td>
##    <td style="text-align:right;"> 0.340 </td>
##    <td style="text-align:right;"> 0.133 </td>
##    <td style="text-align:right;"> 4.000000e-02 </td>
##    <td style="text-align:right;"> 7.700000e-01 </td>
##    <td style="text-align:right;"> 7.300000e-01 </td>
##    <td style="text-align:right;"> 0.601 </td>
##    <td style="text-align:right;"> -0.530 </td>
##    <td style="text-align:right;"> 2.200000e-02 </td>
##    <td style="text-align:right;"> 0.270 </td>
##    <td style="text-align:right;"> 0.230 </td>
##    <td style="text-align:right;"> 0.500 </td>
##   </tr>
##   <tr>
##    <td style="text-align:left;"> AdjPxDays </td>
##    <td style="text-align:right;"> 14 </td>
##    <td style="text-align:right;"> 65 </td>
##    <td style="text-align:right;"> 3.615000e+00 </td>
##    <td style="text-align:right;"> 2.593000e+00 </td>
##    <td style="text-align:right;"> 3.247 </td>
##    <td style="text-align:right;"> 3.360 </td>
##    <td style="text-align:right;"> 2.586 </td>
##    <td style="text-align:right;"> 9.400000e-02 </td>
##    <td style="text-align:right;"> 1.223300e+01 </td>
##    <td style="text-align:right;"> 1.213900e+01 </td>
##    <td style="text-align:right;"> 0.939 </td>
##    <td style="text-align:right;"> 0.641 </td>
##    <td style="text-align:right;"> 3.220000e-01 </td>
##    <td style="text-align:right;"> 3.466 </td>
##    <td style="text-align:right;"> 1.567 </td>
##    <td style="text-align:right;"> 5.033 </td>
##   </tr>
##   <tr>
##    <td style="text-align:left;"> Alt1Ohls3 </td>
##    <td style="text-align:right;"> 15 </td>
##    <td style="text-align:right;"> 65 </td>
##    <td style="text-align:right;"> 6.700000e-02 </td>
##    <td style="text-align:right;"> 7.940000e-01 </td>
##    <td style="text-align:right;"> 0.060 </td>
##    <td style="text-align:right;"> 0.014 </td>
##    <td style="text-align:right;"> 0.460 </td>
##    <td style="text-align:right;"> -2.400000e+00 </td>
##    <td style="text-align:right;"> 3.070000e+00 </td>
##    <td style="text-align:right;"> 5.470000e+00 </td>
##    <td style="text-align:right;"> 0.809 </td>
##    <td style="text-align:right;"> 3.557 </td>
##    <td style="text-align:right;"> 9.800000e-02 </td>
##    <td style="text-align:right;"> 0.660 </td>
##    <td style="text-align:right;"> -0.320 </td>
##    <td style="text-align:right;"> 0.340 </td>
##   </tr>
##   <tr>
##    <td style="text-align:left;"> AltmanX2 </td>
##    <td style="text-align:right;"> 16 </td>
##    <td style="text-align:right;"> 65 </td>
##    <td style="text-align:right;"> -4.300000e-02 </td>
##    <td style="text-align:right;"> 4.350000e-01 </td>
##    <td style="text-align:right;"> -0.070 </td>
##    <td style="text-align:right;"> -0.044 </td>
##    <td style="text-align:right;"> 0.163 </td>
##    <td style="text-align:right;"> -1.930000e+00 </td>
##    <td style="text-align:right;"> 1.940000e+00 </td>
##    <td style="text-align:right;"> 3.870000e+00 </td>
##    <td style="text-align:right;"> 0.114 </td>
##    <td style="text-align:right;"> 10.017 </td>
##    <td style="text-align:right;"> 5.400000e-02 </td>
##    <td style="text-align:right;"> 0.220 </td>
##    <td style="text-align:right;"> -0.160 </td>
##    <td style="text-align:right;"> 0.060 </td>
##   </tr>
##   <tr>
##    <td style="text-align:left;"> AltmanX3 </td>
##    <td style="text-align:right;"> 17 </td>
##    <td style="text-align:right;"> 65 </td>
##    <td style="text-align:right;"> -6.300000e-02 </td>
##    <td style="text-align:right;"> 3.400000e-01 </td>
##    <td style="text-align:right;"> -0.080 </td>
##    <td style="text-align:right;"> -0.052 </td>
##    <td style="text-align:right;"> 0.193 </td>
##    <td style="text-align:right;"> -1.390000e+00 </td>
##    <td style="text-align:right;"> 9.600000e-01 </td>
##    <td style="text-align:right;"> 2.350000e+00 </td>
##    <td style="text-align:right;"> -0.899 </td>
##    <td style="text-align:right;"> 5.012 </td>
##    <td style="text-align:right;"> 4.200000e-02 </td>
##    <td style="text-align:right;"> 0.260 </td>
##    <td style="text-align:right;"> -0.180 </td>
##    <td style="text-align:right;"> 0.080 </td>
##   </tr>
##   <tr>
##    <td style="text-align:left;"> AltmanX4 </td>
##    <td style="text-align:right;"> 18 </td>
##    <td style="text-align:right;"> 65 </td>
##    <td style="text-align:right;"> 2.455094e+08 </td>
##    <td style="text-align:right;"> 7.366824e+08 </td>
##    <td style="text-align:right;"> -0.060 </td>
##    <td style="text-align:right;"> 39316845.335 </td>
##    <td style="text-align:right;"> 0.208 </td>
##    <td style="text-align:right;"> -2.022990e+07 </td>
##    <td style="text-align:right;"> 3.386537e+09 </td>
##    <td style="text-align:right;"> 3.406767e+09 </td>
##    <td style="text-align:right;"> 3.261 </td>
##    <td style="text-align:right;"> 9.700 </td>
##    <td style="text-align:right;"> 9.137421e+07 </td>
##    <td style="text-align:right;"> 0.360 </td>
##    <td style="text-align:right;"> -0.170 </td>
##    <td style="text-align:right;"> 0.190 </td>
##   </tr>
##   <tr>
##    <td style="text-align:left;"> OhlsonX1 </td>
##    <td style="text-align:right;"> 19 </td>
##    <td style="text-align:right;"> 65 </td>
##    <td style="text-align:right;"> 1.087700e+01 </td>
##    <td style="text-align:right;"> 9.950000e-01 </td>
##    <td style="text-align:right;"> 10.880 </td>
##    <td style="text-align:right;"> 10.919 </td>
##    <td style="text-align:right;"> 1.067 </td>
##    <td style="text-align:right;"> 8.450000e+00 </td>
##    <td style="text-align:right;"> 1.265000e+01 </td>
##    <td style="text-align:right;"> 4.200000e+00 </td>
##    <td style="text-align:right;"> -0.256 </td>
##    <td style="text-align:right;"> -0.596 </td>
##    <td style="text-align:right;"> 1.230000e-01 </td>
##    <td style="text-align:right;"> 1.390 </td>
##    <td style="text-align:right;"> 10.260 </td>
##    <td style="text-align:right;"> 11.650 </td>
##   </tr>
##   <tr>
##    <td style="text-align:left;"> OhlsonX2 </td>
##    <td style="text-align:right;"> 20 </td>
##    <td style="text-align:right;"> 65 </td>
##    <td style="text-align:right;"> 7.680000e-01 </td>
##    <td style="text-align:right;"> 1.201000e+00 </td>
##    <td style="text-align:right;"> 0.790 </td>
##    <td style="text-align:right;"> 0.766 </td>
##    <td style="text-align:right;"> 0.712 </td>
##    <td style="text-align:right;"> -3.700000e+00 </td>
##    <td style="text-align:right;"> 3.410000e+00 </td>
##    <td style="text-align:right;"> 7.110000e+00 </td>
##    <td style="text-align:right;"> -0.401 </td>
##    <td style="text-align:right;"> 2.106 </td>
##    <td style="text-align:right;"> 1.490000e-01 </td>
##    <td style="text-align:right;"> 0.890 </td>
##    <td style="text-align:right;"> 0.230 </td>
##    <td style="text-align:right;"> 1.120 </td>
##   </tr>
##   <tr>
##    <td style="text-align:left;"> OhlsonX4 </td>
##    <td style="text-align:right;"> 21 </td>
##    <td style="text-align:right;"> 65 </td>
##    <td style="text-align:right;"> 1.025000e+00 </td>
##    <td style="text-align:right;"> 2.238000e+00 </td>
##    <td style="text-align:right;"> 0.890 </td>
##    <td style="text-align:right;"> 0.973 </td>
##    <td style="text-align:right;"> 1.334 </td>
##    <td style="text-align:right;"> -4.900000e+00 </td>
##    <td style="text-align:right;"> 1.187000e+01 </td>
##    <td style="text-align:right;"> 1.677000e+01 </td>
##    <td style="text-align:right;"> 1.288 </td>
##    <td style="text-align:right;"> 7.697 </td>
##    <td style="text-align:right;"> 2.780000e-01 </td>
##    <td style="text-align:right;"> 1.600 </td>
##    <td style="text-align:right;"> 0.340 </td>
##    <td style="text-align:right;"> 1.940 </td>
##   </tr>
##   <tr>
##    <td style="text-align:left;"> OhlsonX6 </td>
##    <td style="text-align:right;"> 22 </td>
##    <td style="text-align:right;"> 65 </td>
##    <td style="text-align:right;"> -5.100000e-02 </td>
##    <td style="text-align:right;"> 2.970000e-01 </td>
##    <td style="text-align:right;"> -0.060 </td>
##    <td style="text-align:right;"> -0.044 </td>
##    <td style="text-align:right;"> 0.133 </td>
##    <td style="text-align:right;"> -1.470000e+00 </td>
##    <td style="text-align:right;"> 7.200000e-01 </td>
##    <td style="text-align:right;"> 2.190000e+00 </td>
##    <td style="text-align:right;"> -1.800 </td>
##    <td style="text-align:right;"> 9.184 </td>
##    <td style="text-align:right;"> 3.700000e-02 </td>
##    <td style="text-align:right;"> 0.160 </td>
##    <td style="text-align:right;"> -0.130 </td>
##    <td style="text-align:right;"> 0.030 </td>
##   </tr>
##   <tr>
##    <td style="text-align:left;"> OhlsonX7 </td>
##    <td style="text-align:right;"> 23 </td>
##    <td style="text-align:right;"> 65 </td>
##    <td style="text-align:right;"> 2.878342e+08 </td>
##    <td style="text-align:right;"> 8.200204e+08 </td>
##    <td style="text-align:right;"> -0.080 </td>
##    <td style="text-align:right;"> 58227343.369 </td>
##    <td style="text-align:right;"> 0.208 </td>
##    <td style="text-align:right;"> -1.050000e+00 </td>
##    <td style="text-align:right;"> 3.773668e+09 </td>
##    <td style="text-align:right;"> 3.773668e+09 </td>
##    <td style="text-align:right;"> 3.093 </td>
##    <td style="text-align:right;"> 8.639 </td>
##    <td style="text-align:right;"> 1.017110e+08 </td>
##    <td style="text-align:right;"> 0.440 </td>
##    <td style="text-align:right;"> -0.170 </td>
##    <td style="text-align:right;"> 0.270 </td>
##   </tr>
##   <tr>
##    <td style="text-align:left;"> OhlsonX9 </td>
##    <td style="text-align:right;"> 24 </td>
##    <td style="text-align:right;"> 65 </td>
##    <td style="text-align:right;"> -9.749833e+05 </td>
##    <td style="text-align:right;"> 1.748250e+07 </td>
##    <td style="text-align:right;"> -2099769.000 </td>
##    <td style="text-align:right;"> -1683258.717 </td>
##    <td style="text-align:right;"> 6408557.774 </td>
##    <td style="text-align:right;"> -4.623097e+07 </td>
##    <td style="text-align:right;"> 8.574380e+07 </td>
##    <td style="text-align:right;"> 1.319748e+08 </td>
##    <td style="text-align:right;"> 1.554 </td>
##    <td style="text-align:right;"> 8.484 </td>
##    <td style="text-align:right;"> 2.168437e+06 </td>
##    <td style="text-align:right;"> 8636372.000 </td>
##    <td style="text-align:right;"> -6436159.000 </td>
##    <td style="text-align:right;"> 2200213.000 </td>
##   </tr>
##   <tr>
##    <td style="text-align:left;"> OhlsonX5 </td>
##    <td style="text-align:right;"> 25 </td>
##    <td style="text-align:right;"> 65 </td>
##    <td style="text-align:right;"> 3.850000e-01 </td>
##    <td style="text-align:right;"> 4.900000e-01 </td>
##    <td style="text-align:right;"> 0.000 </td>
##    <td style="text-align:right;"> 0.358 </td>
##    <td style="text-align:right;"> 0.000 </td>
##    <td style="text-align:right;"> 0.000000e+00 </td>
##    <td style="text-align:right;"> 1.000000e+00 </td>
##    <td style="text-align:right;"> 1.000000e+00 </td>
##    <td style="text-align:right;"> 0.463 </td>
##    <td style="text-align:right;"> -1.812 </td>
##    <td style="text-align:right;"> 6.100000e-02 </td>
##    <td style="text-align:right;"> 1.000 </td>
##    <td style="text-align:right;"> 0.000 </td>
##    <td style="text-align:right;"> 1.000 </td>
##   </tr>
##   <tr>
##    <td style="text-align:left;"> OhlsonX8 </td>
##    <td style="text-align:right;"> 26 </td>
##    <td style="text-align:right;"> 65 </td>
##    <td style="text-align:right;"> 6.770000e-01 </td>
##    <td style="text-align:right;"> 4.710000e-01 </td>
##    <td style="text-align:right;"> 1.000 </td>
##    <td style="text-align:right;"> 0.717 </td>
##    <td style="text-align:right;"> 0.000 </td>
##    <td style="text-align:right;"> 0.000000e+00 </td>
##    <td style="text-align:right;"> 1.000000e+00 </td>
##    <td style="text-align:right;"> 1.000000e+00 </td>
##    <td style="text-align:right;"> -0.739 </td>
##    <td style="text-align:right;"> -1.476 </td>
##    <td style="text-align:right;"> 5.800000e-02 </td>
##    <td style="text-align:right;"> 1.000 </td>
##    <td style="text-align:right;"> 0.000 </td>
##    <td style="text-align:right;"> 1.000 </td>
##   </tr>
##   <tr>
##    <td style="text-align:left;"> Govt </td>
##    <td style="text-align:right;"> 27 </td>
##    <td style="text-align:right;"> 65 </td>
##    <td style="text-align:right;"> 1.230000e-01 </td>
##    <td style="text-align:right;"> 3.310000e-01 </td>
##    <td style="text-align:right;"> 0.000 </td>
##    <td style="text-align:right;"> 0.038 </td>
##    <td style="text-align:right;"> 0.000 </td>
##    <td style="text-align:right;"> 0.000000e+00 </td>
##    <td style="text-align:right;"> 1.000000e+00 </td>
##    <td style="text-align:right;"> 1.000000e+00 </td>
##    <td style="text-align:right;"> 2.242 </td>
##    <td style="text-align:right;"> 3.074 </td>
##    <td style="text-align:right;"> 4.100000e-02 </td>
##    <td style="text-align:right;"> 0.000 </td>
##    <td style="text-align:right;"> 0.000 </td>
##    <td style="text-align:right;"> 0.000 </td>
##   </tr>
##   <tr>
##    <td style="text-align:left;"> Urban </td>
##    <td style="text-align:right;"> 28 </td>
##    <td style="text-align:right;"> 65 </td>
##    <td style="text-align:right;"> 1.850000e-01 </td>
##    <td style="text-align:right;"> 3.910000e-01 </td>
##    <td style="text-align:right;"> 0.000 </td>
##    <td style="text-align:right;"> 0.113 </td>
##    <td style="text-align:right;"> 0.000 </td>
##    <td style="text-align:right;"> 0.000000e+00 </td>
##    <td style="text-align:right;"> 1.000000e+00 </td>
##    <td style="text-align:right;"> 1.000000e+00 </td>
##    <td style="text-align:right;"> 1.588 </td>
##    <td style="text-align:right;"> 0.532 </td>
##    <td style="text-align:right;"> 4.800000e-02 </td>
##    <td style="text-align:right;"> 0.000 </td>
##    <td style="text-align:right;"> 0.000 </td>
##    <td style="text-align:right;"> 0.000 </td>
##   </tr>
##   <tr>
##    <td style="text-align:left;"> ForProfit </td>
##    <td style="text-align:right;"> 29 </td>
##    <td style="text-align:right;"> 65 </td>
##    <td style="text-align:right;"> 5.380000e-01 </td>
##    <td style="text-align:right;"> 5.020000e-01 </td>
##    <td style="text-align:right;"> 1.000 </td>
##    <td style="text-align:right;"> 0.547 </td>
##    <td style="text-align:right;"> 0.000 </td>
##    <td style="text-align:right;"> 0.000000e+00 </td>
##    <td style="text-align:right;"> 1.000000e+00 </td>
##    <td style="text-align:right;"> 1.000000e+00 </td>
##    <td style="text-align:right;"> -0.151 </td>
##    <td style="text-align:right;"> -2.007 </td>
##    <td style="text-align:right;"> 6.200000e-02 </td>
##    <td style="text-align:right;"> 1.000 </td>
##    <td style="text-align:right;"> 0.000 </td>
##    <td style="text-align:right;"> 1.000 </td>
##   </tr>
##   <tr>
##    <td style="text-align:left;"> HC1 </td>
##    <td style="text-align:right;"> 30 </td>
##    <td style="text-align:right;"> 65 </td>
##    <td style="text-align:right;"> 1.230000e-01 </td>
##    <td style="text-align:right;"> 3.310000e-01 </td>
##    <td style="text-align:right;"> 0.000 </td>
##    <td style="text-align:right;"> 0.038 </td>
##    <td style="text-align:right;"> 0.000 </td>
##    <td style="text-align:right;"> 0.000000e+00 </td>
##    <td style="text-align:right;"> 1.000000e+00 </td>
##    <td style="text-align:right;"> 1.000000e+00 </td>
##    <td style="text-align:right;"> 2.242 </td>
##    <td style="text-align:right;"> 3.074 </td>
##    <td style="text-align:right;"> 4.100000e-02 </td>
##    <td style="text-align:right;"> 0.000 </td>
##    <td style="text-align:right;"> 0.000 </td>
##    <td style="text-align:right;"> 0.000 </td>
##   </tr>
##   <tr>
##    <td style="text-align:left;"> HC2 </td>
##    <td style="text-align:right;"> 31 </td>
##    <td style="text-align:right;"> 65 </td>
##    <td style="text-align:right;"> 3.540000e-01 </td>
##    <td style="text-align:right;"> 4.820000e-01 </td>
##    <td style="text-align:right;"> 0.000 </td>
##    <td style="text-align:right;"> 0.321 </td>
##    <td style="text-align:right;"> 0.000 </td>
##    <td style="text-align:right;"> 0.000000e+00 </td>
##    <td style="text-align:right;"> 1.000000e+00 </td>
##    <td style="text-align:right;"> 1.000000e+00 </td>
##    <td style="text-align:right;"> 0.597 </td>
##    <td style="text-align:right;"> -1.668 </td>
##    <td style="text-align:right;"> 6.000000e-02 </td>
##    <td style="text-align:right;"> 1.000 </td>
##    <td style="text-align:right;"> 0.000 </td>
##    <td style="text-align:right;"> 1.000 </td>
##   </tr>
##   <tr>
##    <td style="text-align:left;"> HC4 </td>
##    <td style="text-align:right;"> 32 </td>
##    <td style="text-align:right;"> 65 </td>
##    <td style="text-align:right;"> 6.200000e-02 </td>
##    <td style="text-align:right;"> 2.420000e-01 </td>
##    <td style="text-align:right;"> 0.000 </td>
##    <td style="text-align:right;"> 0.000 </td>
##    <td style="text-align:right;"> 0.000 </td>
##    <td style="text-align:right;"> 0.000000e+00 </td>
##    <td style="text-align:right;"> 1.000000e+00 </td>
##    <td style="text-align:right;"> 1.000000e+00 </td>
##    <td style="text-align:right;"> 3.565 </td>
##    <td style="text-align:right;"> 10.878 </td>
##    <td style="text-align:right;"> 3.000000e-02 </td>
##    <td style="text-align:right;"> 0.000 </td>
##    <td style="text-align:right;"> 0.000 </td>
##    <td style="text-align:right;"> 0.000 </td>
##   </tr>
##   <tr>
##    <td style="text-align:left;"> HC5 </td>
##    <td style="text-align:right;"> 33 </td>
##    <td style="text-align:right;"> 65 </td>
##    <td style="text-align:right;"> 4.600000e-02 </td>
##    <td style="text-align:right;"> 2.110000e-01 </td>
##    <td style="text-align:right;"> 0.000 </td>
##    <td style="text-align:right;"> 0.000 </td>
##    <td style="text-align:right;"> 0.000 </td>
##    <td style="text-align:right;"> 0.000000e+00 </td>
##    <td style="text-align:right;"> 1.000000e+00 </td>
##    <td style="text-align:right;"> 1.000000e+00 </td>
##    <td style="text-align:right;"> 4.227 </td>
##    <td style="text-align:right;"> 16.113 </td>
##    <td style="text-align:right;"> 2.600000e-02 </td>
##    <td style="text-align:right;"> 0.000 </td>
##    <td style="text-align:right;"> 0.000 </td>
##    <td style="text-align:right;"> 0.000 </td>
##   </tr>
##   <tr>
##    <td style="text-align:left;"> AR_by_OpIncome.y.1. </td>
##    <td style="text-align:right;"> 34 </td>
##    <td style="text-align:right;"> 65 </td>
##    <td style="text-align:right;"> 2.256000e+00 </td>
##    <td style="text-align:right;"> 2.450000e+00 </td>
##    <td style="text-align:right;"> 1.483 </td>
##    <td style="text-align:right;"> 1.912 </td>
##    <td style="text-align:right;"> 2.083 </td>
##    <td style="text-align:right;"> 4.000000e-03 </td>
##    <td style="text-align:right;"> 8.594000e+00 </td>
##    <td style="text-align:right;"> 8.590000e+00 </td>
##    <td style="text-align:right;"> 0.920 </td>
##    <td style="text-align:right;"> -0.209 </td>
##    <td style="text-align:right;"> 3.040000e-01 </td>
##    <td style="text-align:right;"> 4.302 </td>
##    <td style="text-align:right;"> 0.136 </td>
##    <td style="text-align:right;"> 4.438 </td>
##   </tr>
##   <tr>
##    <td style="text-align:left;"> FB_Plus_OpInc_ByFB.y.1. </td>
##    <td style="text-align:right;"> 35 </td>
##    <td style="text-align:right;"> 65 </td>
##    <td style="text-align:right;"> 1.241000e+00 </td>
##    <td style="text-align:right;"> 2.316000e+00 </td>
##    <td style="text-align:right;"> 1.080 </td>
##    <td style="text-align:right;"> 0.965 </td>
##    <td style="text-align:right;"> 0.445 </td>
##    <td style="text-align:right;"> -2.090000e+00 </td>
##    <td style="text-align:right;"> 1.683000e+01 </td>
##    <td style="text-align:right;"> 1.892000e+01 </td>
##    <td style="text-align:right;"> 4.838 </td>
##    <td style="text-align:right;"> 29.300 </td>
##    <td style="text-align:right;"> 2.870000e-01 </td>
##    <td style="text-align:right;"> 0.650 </td>
##    <td style="text-align:right;"> 0.660 </td>
##    <td style="text-align:right;"> 1.310 </td>
##   </tr>
##   <tr>
##    <td style="text-align:left;"> PercentMedicaidDays.y.1. </td>
##    <td style="text-align:right;"> 36 </td>
##    <td style="text-align:right;"> 65 </td>
##    <td style="text-align:right;"> 1.030000e-01 </td>
##    <td style="text-align:right;"> 1.070000e-01 </td>
##    <td style="text-align:right;"> 0.060 </td>
##    <td style="text-align:right;"> 0.084 </td>
##    <td style="text-align:right;"> 0.059 </td>
##    <td style="text-align:right;"> 1.000000e-02 </td>
##    <td style="text-align:right;"> 4.500000e-01 </td>
##    <td style="text-align:right;"> 4.400000e-01 </td>
##    <td style="text-align:right;"> 1.687 </td>
##    <td style="text-align:right;"> 2.402 </td>
##    <td style="text-align:right;"> 1.300000e-02 </td>
##    <td style="text-align:right;"> 0.110 </td>
##    <td style="text-align:right;"> 0.030 </td>
##    <td style="text-align:right;"> 0.140 </td>
##   </tr>
##   <tr>
##    <td style="text-align:left;"> PercentMedicareDays.y.1. </td>
##    <td style="text-align:right;"> 37 </td>
##    <td style="text-align:right;"> 65 </td>
##    <td style="text-align:right;"> 3.250000e-01 </td>
##    <td style="text-align:right;"> 1.330000e-01 </td>
##    <td style="text-align:right;"> 0.300 </td>
##    <td style="text-align:right;"> 0.316 </td>
##    <td style="text-align:right;"> 0.104 </td>
##    <td style="text-align:right;"> 6.000000e-02 </td>
##    <td style="text-align:right;"> 7.800000e-01 </td>
##    <td style="text-align:right;"> 7.200000e-01 </td>
##    <td style="text-align:right;"> 0.812 </td>
##    <td style="text-align:right;"> 0.855 </td>
##    <td style="text-align:right;"> 1.600000e-02 </td>
##    <td style="text-align:right;"> 0.150 </td>
##    <td style="text-align:right;"> 0.240 </td>
##    <td style="text-align:right;"> 0.390 </td>
##   </tr>
##   <tr>
##    <td style="text-align:left;"> CurrentRatio.y.1. </td>
##    <td style="text-align:right;"> 38 </td>
##    <td style="text-align:right;"> 65 </td>
##    <td style="text-align:right;"> -4.407000e+00 </td>
##    <td style="text-align:right;"> 2.859200e+01 </td>
##    <td style="text-align:right;"> 0.760 </td>
##    <td style="text-align:right;"> 0.864 </td>
##    <td style="text-align:right;"> 1.023 </td>
##    <td style="text-align:right;"> -1.879700e+02 </td>
##    <td style="text-align:right;"> 1.232000e+01 </td>
##    <td style="text-align:right;"> 2.002900e+02 </td>
##    <td style="text-align:right;"> -5.419 </td>
##    <td style="text-align:right;"> 29.181 </td>
##    <td style="text-align:right;"> 3.546000e+00 </td>
##    <td style="text-align:right;"> 1.420 </td>
##    <td style="text-align:right;"> 0.210 </td>
##    <td style="text-align:right;"> 1.630 </td>
##   </tr>
##   <tr>
##    <td style="text-align:left;"> Debt2Equity.y.1. </td>
##    <td style="text-align:right;"> 39 </td>
##    <td style="text-align:right;"> 65 </td>
##    <td style="text-align:right;"> 6.070000e-01 </td>
##    <td style="text-align:right;"> 5.370000e+00 </td>
##    <td style="text-align:right;"> 0.130 </td>
##    <td style="text-align:right;"> 0.257 </td>
##    <td style="text-align:right;"> 0.979 </td>
##    <td style="text-align:right;"> -2.106000e+01 </td>
##    <td style="text-align:right;"> 2.458000e+01 </td>
##    <td style="text-align:right;"> 4.564000e+01 </td>
##    <td style="text-align:right;"> 0.673 </td>
##    <td style="text-align:right;"> 8.774 </td>
##    <td style="text-align:right;"> 6.660000e-01 </td>
##    <td style="text-align:right;"> 1.110 </td>
##    <td style="text-align:right;"> -0.550 </td>
##    <td style="text-align:right;"> 0.560 </td>
##   </tr>
##   <tr>
##    <td style="text-align:left;"> DaysSalesOutstanding.y.1. </td>
##    <td style="text-align:right;"> 40 </td>
##    <td style="text-align:right;"> 65 </td>
##    <td style="text-align:right;"> 5.660300e+01 </td>
##    <td style="text-align:right;"> 4.449300e+01 </td>
##    <td style="text-align:right;"> 53.680 </td>
##    <td style="text-align:right;"> 57.782 </td>
##    <td style="text-align:right;"> 18.310 </td>
##    <td style="text-align:right;"> -1.959100e+02 </td>
##    <td style="text-align:right;"> 1.652700e+02 </td>
##    <td style="text-align:right;"> 3.611800e+02 </td>
##    <td style="text-align:right;"> -2.461 </td>
##    <td style="text-align:right;"> 14.514 </td>
##    <td style="text-align:right;"> 5.519000e+00 </td>
##    <td style="text-align:right;"> 26.880 </td>
##    <td style="text-align:right;"> 43.920 </td>
##    <td style="text-align:right;"> 70.800 </td>
##   </tr>
##   <tr>
##    <td style="text-align:left;"> LaborCompRatio.y.1. </td>
##    <td style="text-align:right;"> 41 </td>
##    <td style="text-align:right;"> 65 </td>
##    <td style="text-align:right;"> 4.980000e-01 </td>
##    <td style="text-align:right;"> 1.750000e-01 </td>
##    <td style="text-align:right;"> 0.490 </td>
##    <td style="text-align:right;"> 0.487 </td>
##    <td style="text-align:right;"> 0.208 </td>
##    <td style="text-align:right;"> 2.100000e-01 </td>
##    <td style="text-align:right;"> 1.040000e+00 </td>
##    <td style="text-align:right;"> 8.300000e-01 </td>
##    <td style="text-align:right;"> 0.579 </td>
##    <td style="text-align:right;"> -0.044 </td>
##    <td style="text-align:right;"> 2.200000e-02 </td>
##    <td style="text-align:right;"> 0.290 </td>
##    <td style="text-align:right;"> 0.340 </td>
##    <td style="text-align:right;"> 0.630 </td>
##   </tr>
##   <tr>
##    <td style="text-align:left;"> OpProfitMargin.y.1. </td>
##    <td style="text-align:right;"> 42 </td>
##    <td style="text-align:right;"> 65 </td>
##    <td style="text-align:right;"> -1.200000e-01 </td>
##    <td style="text-align:right;"> 2.410000e-01 </td>
##    <td style="text-align:right;"> -0.120 </td>
##    <td style="text-align:right;"> -0.105 </td>
##    <td style="text-align:right;"> 0.133 </td>
##    <td style="text-align:right;"> -1.010000e+00 </td>
##    <td style="text-align:right;"> 3.600000e-01 </td>
##    <td style="text-align:right;"> 1.370000e+00 </td>
##    <td style="text-align:right;"> -1.200 </td>
##    <td style="text-align:right;"> 3.669 </td>
##    <td style="text-align:right;"> 3.000000e-02 </td>
##    <td style="text-align:right;"> 0.190 </td>
##    <td style="text-align:right;"> -0.190 </td>
##    <td style="text-align:right;"> 0.000 </td>
##   </tr>
##   <tr>
##    <td style="text-align:left;"> DaysCashOnHand.y.1. </td>
##    <td style="text-align:right;"> 43 </td>
##    <td style="text-align:right;"> 65 </td>
##    <td style="text-align:right;"> 1.594300e+01 </td>
##    <td style="text-align:right;"> 2.670300e+01 </td>
##    <td style="text-align:right;"> 3.540 </td>
##    <td style="text-align:right;"> 11.075 </td>
##    <td style="text-align:right;"> 11.342 </td>
##    <td style="text-align:right;"> -8.980000e+00 </td>
##    <td style="text-align:right;"> 1.056400e+02 </td>
##    <td style="text-align:right;"> 1.146200e+02 </td>
##    <td style="text-align:right;"> 1.678 </td>
##    <td style="text-align:right;"> 2.078 </td>
##    <td style="text-align:right;"> 3.312000e+00 </td>
##    <td style="text-align:right;"> 19.940 </td>
##    <td style="text-align:right;"> -1.320 </td>
##    <td style="text-align:right;"> 18.620 </td>
##   </tr>
##   <tr>
##    <td style="text-align:left;"> BedUtil.y.1. </td>
##    <td style="text-align:right;"> 44 </td>
##    <td style="text-align:right;"> 65 </td>
##    <td style="text-align:right;"> 3.670000e-01 </td>
##    <td style="text-align:right;"> 2.070000e-01 </td>
##    <td style="text-align:right;"> 0.300 </td>
##    <td style="text-align:right;"> 0.351 </td>
##    <td style="text-align:right;"> 0.193 </td>
##    <td style="text-align:right;"> 7.000000e-02 </td>
##    <td style="text-align:right;"> 9.100000e-01 </td>
##    <td style="text-align:right;"> 8.400000e-01 </td>
##    <td style="text-align:right;"> 0.731 </td>
##    <td style="text-align:right;"> -0.286 </td>
##    <td style="text-align:right;"> 2.600000e-02 </td>
##    <td style="text-align:right;"> 0.280 </td>
##    <td style="text-align:right;"> 0.230 </td>
##    <td style="text-align:right;"> 0.510 </td>
##   </tr>
##   <tr>
##    <td style="text-align:left;"> AdjPxDays.y.1. </td>
##    <td style="text-align:right;"> 45 </td>
##    <td style="text-align:right;"> 65 </td>
##    <td style="text-align:right;"> 3.830000e+00 </td>
##    <td style="text-align:right;"> 2.809000e+00 </td>
##    <td style="text-align:right;"> 3.107 </td>
##    <td style="text-align:right;"> 3.569 </td>
##    <td style="text-align:right;"> 2.811 </td>
##    <td style="text-align:right;"> 1.180000e-01 </td>
##    <td style="text-align:right;"> 1.240900e+01 </td>
##    <td style="text-align:right;"> 1.229100e+01 </td>
##    <td style="text-align:right;"> 0.809 </td>
##    <td style="text-align:right;"> -0.034 </td>
##    <td style="text-align:right;"> 3.480000e-01 </td>
##    <td style="text-align:right;"> 3.964 </td>
##    <td style="text-align:right;"> 1.585 </td>
##    <td style="text-align:right;"> 5.548 </td>
##   </tr>
##   <tr>
##    <td style="text-align:left;"> Alt1Ohls3.y.1. </td>
##    <td style="text-align:right;"> 46 </td>
##    <td style="text-align:right;"> 65 </td>
##    <td style="text-align:right;"> -8.400000e-02 </td>
##    <td style="text-align:right;"> 1.282000e+00 </td>
##    <td style="text-align:right;"> 0.140 </td>
##    <td style="text-align:right;"> 0.036 </td>
##    <td style="text-align:right;"> 0.341 </td>
##    <td style="text-align:right;"> -9.490000e+00 </td>
##    <td style="text-align:right;"> 1.360000e+00 </td>
##    <td style="text-align:right;"> 1.085000e+01 </td>
##    <td style="text-align:right;"> -6.009 </td>
##    <td style="text-align:right;"> 41.671 </td>
##    <td style="text-align:right;"> 1.590000e-01 </td>
##    <td style="text-align:right;"> 0.470 </td>
##    <td style="text-align:right;"> -0.200 </td>
##    <td style="text-align:right;"> 0.270 </td>
##   </tr>
##   <tr>
##    <td style="text-align:left;"> AltmanX2.y.1. </td>
##    <td style="text-align:right;"> 47 </td>
##    <td style="text-align:right;"> 65 </td>
##    <td style="text-align:right;"> -5.300000e-02 </td>
##    <td style="text-align:right;"> 1.000000e+00 </td>
##    <td style="text-align:right;"> -0.060 </td>
##    <td style="text-align:right;"> -0.065 </td>
##    <td style="text-align:right;"> 0.148 </td>
##    <td style="text-align:right;"> -4.500000e+00 </td>
##    <td style="text-align:right;"> 3.720000e+00 </td>
##    <td style="text-align:right;"> 8.220000e+00 </td>
##    <td style="text-align:right;"> -0.605 </td>
##    <td style="text-align:right;"> 9.082 </td>
##    <td style="text-align:right;"> 1.240000e-01 </td>
##    <td style="text-align:right;"> 0.200 </td>
##    <td style="text-align:right;"> -0.170 </td>
##    <td style="text-align:right;"> 0.030 </td>
##   </tr>
##   <tr>
##    <td style="text-align:left;"> AltmanX3.y.1. </td>
##    <td style="text-align:right;"> 48 </td>
##    <td style="text-align:right;"> 65 </td>
##    <td style="text-align:right;"> -1.350000e-01 </td>
##    <td style="text-align:right;"> 7.610000e-01 </td>
##    <td style="text-align:right;"> -0.060 </td>
##    <td style="text-align:right;"> -0.057 </td>
##    <td style="text-align:right;"> 0.237 </td>
##    <td style="text-align:right;"> -5.750000e+00 </td>
##    <td style="text-align:right;"> 7.000000e-01 </td>
##    <td style="text-align:right;"> 6.450000e+00 </td>
##    <td style="text-align:right;"> -6.132 </td>
##    <td style="text-align:right;"> 42.685 </td>
##    <td style="text-align:right;"> 9.400000e-02 </td>
##    <td style="text-align:right;"> 0.300 </td>
##    <td style="text-align:right;"> -0.220 </td>
##    <td style="text-align:right;"> 0.080 </td>
##   </tr>
##   <tr>
##    <td style="text-align:left;"> AltmanX4.y.1. </td>
##    <td style="text-align:right;"> 49 </td>
##    <td style="text-align:right;"> 65 </td>
##    <td style="text-align:right;"> -5.835336e+08 </td>
##    <td style="text-align:right;"> 4.207232e+09 </td>
##    <td style="text-align:right;"> -0.080 </td>
##    <td style="text-align:right;"> 4579764.309 </td>
##    <td style="text-align:right;"> 0.163 </td>
##    <td style="text-align:right;"> -2.914540e+10 </td>
##    <td style="text-align:right;"> 5.545628e+09 </td>
##    <td style="text-align:right;"> 3.469103e+10 </td>
##    <td style="text-align:right;"> -5.521 </td>
##    <td style="text-align:right;"> 32.547 </td>
##    <td style="text-align:right;"> 5.218429e+08 </td>
##    <td style="text-align:right;"> 0.210 </td>
##    <td style="text-align:right;"> -0.180 </td>
##    <td style="text-align:right;"> 0.030 </td>
##   </tr>
##   <tr>
##    <td style="text-align:left;"> OhlsonX1.y.1. </td>
##    <td style="text-align:right;"> 50 </td>
##    <td style="text-align:right;"> 65 </td>
##    <td style="text-align:right;"> 1.090400e+01 </td>
##    <td style="text-align:right;"> 1.070000e+00 </td>
##    <td style="text-align:right;"> 10.940 </td>
##    <td style="text-align:right;"> 10.971 </td>
##    <td style="text-align:right;"> 1.023 </td>
##    <td style="text-align:right;"> 7.770000e+00 </td>
##    <td style="text-align:right;"> 1.277000e+01 </td>
##    <td style="text-align:right;"> 5.000000e+00 </td>
##    <td style="text-align:right;"> -0.588 </td>
##    <td style="text-align:right;"> 0.062 </td>
##    <td style="text-align:right;"> 1.330000e-01 </td>
##    <td style="text-align:right;"> 1.460 </td>
##    <td style="text-align:right;"> 10.280 </td>
##    <td style="text-align:right;"> 11.740 </td>
##   </tr>
##   <tr>
##    <td style="text-align:left;"> OhlsonX2.y.1. </td>
##    <td style="text-align:right;"> 51 </td>
##    <td style="text-align:right;"> 65 </td>
##    <td style="text-align:right;"> 9.930000e-01 </td>
##    <td style="text-align:right;"> 2.158000e+00 </td>
##    <td style="text-align:right;"> 0.730 </td>
##    <td style="text-align:right;"> 0.744 </td>
##    <td style="text-align:right;"> 0.638 </td>
##    <td style="text-align:right;"> -1.600000e+00 </td>
##    <td style="text-align:right;"> 1.668000e+01 </td>
##    <td style="text-align:right;"> 1.828000e+01 </td>
##    <td style="text-align:right;"> 5.873 </td>
##    <td style="text-align:right;"> 40.038 </td>
##    <td style="text-align:right;"> 2.680000e-01 </td>
##    <td style="text-align:right;"> 0.840 </td>
##    <td style="text-align:right;"> 0.210 </td>
##    <td style="text-align:right;"> 1.050 </td>
##   </tr>
##   <tr>
##    <td style="text-align:left;"> OhlsonX4.y.1. </td>
##    <td style="text-align:right;"> 52 </td>
##    <td style="text-align:right;"> 65 </td>
##    <td style="text-align:right;"> 9.440000e-01 </td>
##    <td style="text-align:right;"> 1.829000e+00 </td>
##    <td style="text-align:right;"> 0.690 </td>
##    <td style="text-align:right;"> 0.855 </td>
##    <td style="text-align:right;"> 0.919 </td>
##    <td style="text-align:right;"> -5.460000e+00 </td>
##    <td style="text-align:right;"> 6.630000e+00 </td>
##    <td style="text-align:right;"> 1.209000e+01 </td>
##    <td style="text-align:right;"> 0.216 </td>
##    <td style="text-align:right;"> 2.936 </td>
##    <td style="text-align:right;"> 2.270000e-01 </td>
##    <td style="text-align:right;"> 1.260 </td>
##    <td style="text-align:right;"> 0.280 </td>
##    <td style="text-align:right;"> 1.540 </td>
##   </tr>
##   <tr>
##    <td style="text-align:left;"> OhlsonX6.y.1. </td>
##    <td style="text-align:right;"> 53 </td>
##    <td style="text-align:right;"> 65 </td>
##    <td style="text-align:right;"> -1.510000e-01 </td>
##    <td style="text-align:right;"> 9.350000e-01 </td>
##    <td style="text-align:right;"> -0.040 </td>
##    <td style="text-align:right;"> -0.052 </td>
##    <td style="text-align:right;"> 0.163 </td>
##    <td style="text-align:right;"> -7.390000e+00 </td>
##    <td style="text-align:right;"> 6.300000e-01 </td>
##    <td style="text-align:right;"> 8.020000e+00 </td>
##    <td style="text-align:right;"> -7.123 </td>
##    <td style="text-align:right;"> 52.387 </td>
##    <td style="text-align:right;"> 1.160000e-01 </td>
##    <td style="text-align:right;"> 0.200 </td>
##    <td style="text-align:right;"> -0.170 </td>
##    <td style="text-align:right;"> 0.030 </td>
##   </tr>
##   <tr>
##    <td style="text-align:left;"> OhlsonX7.y.1. </td>
##    <td style="text-align:right;"> 54 </td>
##    <td style="text-align:right;"> 65 </td>
##    <td style="text-align:right;"> 2.268470e+08 </td>
##    <td style="text-align:right;"> 7.127845e+08 </td>
##    <td style="text-align:right;"> -0.080 </td>
##    <td style="text-align:right;"> 30863335.939 </td>
##    <td style="text-align:right;"> 0.252 </td>
##    <td style="text-align:right;"> -4.748313e+08 </td>
##    <td style="text-align:right;"> 3.380771e+09 </td>
##    <td style="text-align:right;"> 3.855603e+09 </td>
##    <td style="text-align:right;"> 3.117 </td>
##    <td style="text-align:right;"> 9.024 </td>
##    <td style="text-align:right;"> 8.841003e+07 </td>
##    <td style="text-align:right;"> 0.350 </td>
##    <td style="text-align:right;"> -0.200 </td>
##    <td style="text-align:right;"> 0.150 </td>
##   </tr>
##   <tr>
##    <td style="text-align:left;"> OhlsonX9.y.1. </td>
##    <td style="text-align:right;"> 55 </td>
##    <td style="text-align:right;"> 65 </td>
##    <td style="text-align:right;"> -8.899894e+06 </td>
##    <td style="text-align:right;"> 4.791898e+07 </td>
##    <td style="text-align:right;"> -2329416.000 </td>
##    <td style="text-align:right;"> -3811671.868 </td>
##    <td style="text-align:right;"> 6454586.573 </td>
##    <td style="text-align:right;"> -2.914540e+08 </td>
##    <td style="text-align:right;"> 8.103354e+07 </td>
##    <td style="text-align:right;"> 3.724876e+08 </td>
##    <td style="text-align:right;"> -3.528 </td>
##    <td style="text-align:right;"> 17.865 </td>
##    <td style="text-align:right;"> 5.943617e+06 </td>
##    <td style="text-align:right;"> 8590542.000 </td>
##    <td style="text-align:right;"> -6566399.000 </td>
##    <td style="text-align:right;"> 2024143.000 </td>
##   </tr>
##   <tr>
##    <td style="text-align:left;"> OhlsonX5.y.1. </td>
##    <td style="text-align:right;"> 56 </td>
##    <td style="text-align:right;"> 65 </td>
##    <td style="text-align:right;"> 3.690000e-01 </td>
##    <td style="text-align:right;"> 4.860000e-01 </td>
##    <td style="text-align:right;"> 0.000 </td>
##    <td style="text-align:right;"> 0.340 </td>
##    <td style="text-align:right;"> 0.000 </td>
##    <td style="text-align:right;"> 0.000000e+00 </td>
##    <td style="text-align:right;"> 1.000000e+00 </td>
##    <td style="text-align:right;"> 1.000000e+00 </td>
##    <td style="text-align:right;"> 0.529 </td>
##    <td style="text-align:right;"> -1.746 </td>
##    <td style="text-align:right;"> 6.000000e-02 </td>
##    <td style="text-align:right;"> 1.000 </td>
##    <td style="text-align:right;"> 0.000 </td>
##    <td style="text-align:right;"> 1.000 </td>
##   </tr>
##   <tr>
##    <td style="text-align:left;"> OhlsonX8.y.1. </td>
##    <td style="text-align:right;"> 57 </td>
##    <td style="text-align:right;"> 65 </td>
##    <td style="text-align:right;"> 6.150000e-01 </td>
##    <td style="text-align:right;"> 4.900000e-01 </td>
##    <td style="text-align:right;"> 1.000 </td>
##    <td style="text-align:right;"> 0.642 </td>
##    <td style="text-align:right;"> 0.000 </td>
##    <td style="text-align:right;"> 0.000000e+00 </td>
##    <td style="text-align:right;"> 1.000000e+00 </td>
##    <td style="text-align:right;"> 1.000000e+00 </td>
##    <td style="text-align:right;"> -0.463 </td>
##    <td style="text-align:right;"> -1.812 </td>
##    <td style="text-align:right;"> 6.100000e-02 </td>
##    <td style="text-align:right;"> 1.000 </td>
##    <td style="text-align:right;"> 0.000 </td>
##    <td style="text-align:right;"> 1.000 </td>
##   </tr>
##   <tr>
##    <td style="text-align:left;"> HC4_5.y.1. </td>
##    <td style="text-align:right;"> 58 </td>
##    <td style="text-align:right;"> 65 </td>
##    <td style="text-align:right;"> 1.080000e-01 </td>
##    <td style="text-align:right;"> 3.120000e-01 </td>
##    <td style="text-align:right;"> 0.000 </td>
##    <td style="text-align:right;"> 0.019 </td>
##    <td style="text-align:right;"> 0.000 </td>
##    <td style="text-align:right;"> 0.000000e+00 </td>
##    <td style="text-align:right;"> 1.000000e+00 </td>
##    <td style="text-align:right;"> 1.000000e+00 </td>
##    <td style="text-align:right;"> 2.473 </td>
##    <td style="text-align:right;"> 4.180 </td>
##    <td style="text-align:right;"> 3.900000e-02 </td>
##    <td style="text-align:right;"> 0.000 </td>
##    <td style="text-align:right;"> 0.000 </td>
##    <td style="text-align:right;"> 0.000 </td>
##   </tr>
##   <tr>
##    <td style="text-align:left;"> AR_by_OpIncome.y.2. </td>
##    <td style="text-align:right;"> 59 </td>
##    <td style="text-align:right;"> 65 </td>
##    <td style="text-align:right;"> 2.375000e+00 </td>
##    <td style="text-align:right;"> 2.471000e+00 </td>
##    <td style="text-align:right;"> 1.539 </td>
##    <td style="text-align:right;"> 2.016 </td>
##    <td style="text-align:right;"> 2.122 </td>
##    <td style="text-align:right;"> 2.000000e-02 </td>
##    <td style="text-align:right;"> 8.565000e+00 </td>
##    <td style="text-align:right;"> 8.545000e+00 </td>
##    <td style="text-align:right;"> 0.940 </td>
##    <td style="text-align:right;"> -0.069 </td>
##    <td style="text-align:right;"> 3.070000e-01 </td>
##    <td style="text-align:right;"> 4.180 </td>
##    <td style="text-align:right;"> 0.135 </td>
##    <td style="text-align:right;"> 4.315 </td>
##   </tr>
##   <tr>
##    <td style="text-align:left;"> FB_Plus_OpInc_ByFB.y.2. </td>
##    <td style="text-align:right;"> 60 </td>
##    <td style="text-align:right;"> 65 </td>
##    <td style="text-align:right;"> -1.161000e+00 </td>
##    <td style="text-align:right;"> 1.212400e+01 </td>
##    <td style="text-align:right;"> 0.970 </td>
##    <td style="text-align:right;"> 0.950 </td>
##    <td style="text-align:right;"> 0.356 </td>
##    <td style="text-align:right;"> -7.298000e+01 </td>
##    <td style="text-align:right;"> 3.090000e+00 </td>
##    <td style="text-align:right;"> 7.607000e+01 </td>
##    <td style="text-align:right;"> -5.328 </td>
##    <td style="text-align:right;"> 27.007 </td>
##    <td style="text-align:right;"> 1.504000e+00 </td>
##    <td style="text-align:right;"> 0.460 </td>
##    <td style="text-align:right;"> 0.730 </td>
##    <td style="text-align:right;"> 1.190 </td>
##   </tr>
##   <tr>
##    <td style="text-align:left;"> PercentMedicaidDays.y.2. </td>
##    <td style="text-align:right;"> 61 </td>
##    <td style="text-align:right;"> 65 </td>
##    <td style="text-align:right;"> 1.030000e-01 </td>
##    <td style="text-align:right;"> 1.070000e-01 </td>
##    <td style="text-align:right;"> 0.060 </td>
##    <td style="text-align:right;"> 0.084 </td>
##    <td style="text-align:right;"> 0.059 </td>
##    <td style="text-align:right;"> 1.000000e-02 </td>
##    <td style="text-align:right;"> 4.500000e-01 </td>
##    <td style="text-align:right;"> 4.400000e-01 </td>
##    <td style="text-align:right;"> 1.687 </td>
##    <td style="text-align:right;"> 2.402 </td>
##    <td style="text-align:right;"> 1.300000e-02 </td>
##    <td style="text-align:right;"> 0.110 </td>
##    <td style="text-align:right;"> 0.030 </td>
##    <td style="text-align:right;"> 0.140 </td>
##   </tr>
##   <tr>
##    <td style="text-align:left;"> PercentMedicareDays.y.2. </td>
##    <td style="text-align:right;"> 62 </td>
##    <td style="text-align:right;"> 65 </td>
##    <td style="text-align:right;"> 3.250000e-01 </td>
##    <td style="text-align:right;"> 1.330000e-01 </td>
##    <td style="text-align:right;"> 0.300 </td>
##    <td style="text-align:right;"> 0.316 </td>
##    <td style="text-align:right;"> 0.104 </td>
##    <td style="text-align:right;"> 6.000000e-02 </td>
##    <td style="text-align:right;"> 7.800000e-01 </td>
##    <td style="text-align:right;"> 7.200000e-01 </td>
##    <td style="text-align:right;"> 0.812 </td>
##    <td style="text-align:right;"> 0.855 </td>
##    <td style="text-align:right;"> 1.600000e-02 </td>
##    <td style="text-align:right;"> 0.150 </td>
##    <td style="text-align:right;"> 0.240 </td>
##    <td style="text-align:right;"> 0.390 </td>
##   </tr>
##   <tr>
##    <td style="text-align:left;"> CurrentRatio.y.2. </td>
##    <td style="text-align:right;"> 63 </td>
##    <td style="text-align:right;"> 65 </td>
##    <td style="text-align:right;"> 1.394000e+00 </td>
##    <td style="text-align:right;"> 2.347000e+00 </td>
##    <td style="text-align:right;"> 1.020 </td>
##    <td style="text-align:right;"> 1.255 </td>
##    <td style="text-align:right;"> 1.127 </td>
##    <td style="text-align:right;"> -8.260000e+00 </td>
##    <td style="text-align:right;"> 1.070000e+01 </td>
##    <td style="text-align:right;"> 1.896000e+01 </td>
##    <td style="text-align:right;"> 0.300 </td>
##    <td style="text-align:right;"> 6.414 </td>
##    <td style="text-align:right;"> 2.910000e-01 </td>
##    <td style="text-align:right;"> 1.610 </td>
##    <td style="text-align:right;"> 0.270 </td>
##    <td style="text-align:right;"> 1.880 </td>
##   </tr>
##   <tr>
##    <td style="text-align:left;"> Debt2Equity.y.2. </td>
##    <td style="text-align:right;"> 64 </td>
##    <td style="text-align:right;"> 65 </td>
##    <td style="text-align:right;"> 4.573000e+00 </td>
##    <td style="text-align:right;"> 2.157200e+01 </td>
##    <td style="text-align:right;"> 0.320 </td>
##    <td style="text-align:right;"> 0.525 </td>
##    <td style="text-align:right;"> 0.741 </td>
##    <td style="text-align:right;"> -5.230000e+00 </td>
##    <td style="text-align:right;"> 1.558300e+02 </td>
##    <td style="text-align:right;"> 1.610600e+02 </td>
##    <td style="text-align:right;"> 5.833 </td>
##    <td style="text-align:right;"> 35.855 </td>
##    <td style="text-align:right;"> 2.676000e+00 </td>
##    <td style="text-align:right;"> 1.100 </td>
##    <td style="text-align:right;"> 0.000 </td>
##    <td style="text-align:right;"> 1.100 </td>
##   </tr>
##   <tr>
##    <td style="text-align:left;"> DaysSalesOutstanding.y.2. </td>
##    <td style="text-align:right;"> 65 </td>
##    <td style="text-align:right;"> 65 </td>
##    <td style="text-align:right;"> 5.975100e+01 </td>
##    <td style="text-align:right;"> 2.838300e+01 </td>
##    <td style="text-align:right;"> 56.640 </td>
##    <td style="text-align:right;"> 57.276 </td>
##    <td style="text-align:right;"> 19.363 </td>
##    <td style="text-align:right;"> -1.972000e+01 </td>
##    <td style="text-align:right;"> 1.743900e+02 </td>
##    <td style="text-align:right;"> 1.941100e+02 </td>
##    <td style="text-align:right;"> 1.150 </td>
##    <td style="text-align:right;"> 3.952 </td>
##    <td style="text-align:right;"> 3.521000e+00 </td>
##    <td style="text-align:right;"> 25.310 </td>
##    <td style="text-align:right;"> 45.130 </td>
##    <td style="text-align:right;"> 70.440 </td>
##   </tr>
##   <tr>
##    <td style="text-align:left;"> LaborCompRatio.y.2. </td>
##    <td style="text-align:right;"> 66 </td>
##    <td style="text-align:right;"> 65 </td>
##    <td style="text-align:right;"> 4.880000e-01 </td>
##    <td style="text-align:right;"> 1.850000e-01 </td>
##    <td style="text-align:right;"> 0.450 </td>
##    <td style="text-align:right;"> 0.479 </td>
##    <td style="text-align:right;"> 0.193 </td>
##    <td style="text-align:right;"> 7.000000e-02 </td>
##    <td style="text-align:right;"> 9.900000e-01 </td>
##    <td style="text-align:right;"> 9.200000e-01 </td>
##    <td style="text-align:right;"> 0.400 </td>
##    <td style="text-align:right;"> -0.416 </td>
##    <td style="text-align:right;"> 2.300000e-02 </td>
##    <td style="text-align:right;"> 0.270 </td>
##    <td style="text-align:right;"> 0.340 </td>
##    <td style="text-align:right;"> 0.610 </td>
##   </tr>
##   <tr>
##    <td style="text-align:left;"> OpProfitMargin.y.2. </td>
##    <td style="text-align:right;"> 67 </td>
##    <td style="text-align:right;"> 65 </td>
##    <td style="text-align:right;"> -1.090000e-01 </td>
##    <td style="text-align:right;"> 2.440000e-01 </td>
##    <td style="text-align:right;"> -0.070 </td>
##    <td style="text-align:right;"> -0.094 </td>
##    <td style="text-align:right;"> 0.119 </td>
##    <td style="text-align:right;"> -1.140000e+00 </td>
##    <td style="text-align:right;"> 3.800000e-01 </td>
##    <td style="text-align:right;"> 1.520000e+00 </td>
##    <td style="text-align:right;"> -1.234 </td>
##    <td style="text-align:right;"> 3.961 </td>
##    <td style="text-align:right;"> 3.000000e-02 </td>
##    <td style="text-align:right;"> 0.190 </td>
##    <td style="text-align:right;"> -0.180 </td>
##    <td style="text-align:right;"> 0.010 </td>
##   </tr>
##   <tr>
##    <td style="text-align:left;"> DaysCashOnHand.y.2. </td>
##    <td style="text-align:right;"> 68 </td>
##    <td style="text-align:right;"> 65 </td>
##    <td style="text-align:right;"> 1.645200e+01 </td>
##    <td style="text-align:right;"> 2.851000e+01 </td>
##    <td style="text-align:right;"> 1.880 </td>
##    <td style="text-align:right;"> 11.058 </td>
##    <td style="text-align:right;"> 9.978 </td>
##    <td style="text-align:right;"> -7.850000e+00 </td>
##    <td style="text-align:right;"> 1.110700e+02 </td>
##    <td style="text-align:right;"> 1.189200e+02 </td>
##    <td style="text-align:right;"> 1.641 </td>
##    <td style="text-align:right;"> 1.806 </td>
##    <td style="text-align:right;"> 3.536000e+00 </td>
##    <td style="text-align:right;"> 25.670 </td>
##    <td style="text-align:right;"> -0.910 </td>
##    <td style="text-align:right;"> 24.760 </td>
##   </tr>
##   <tr>
##    <td style="text-align:left;"> BedUtil.y.2. </td>
##    <td style="text-align:right;"> 69 </td>
##    <td style="text-align:right;"> 65 </td>
##    <td style="text-align:right;"> 3.660000e-01 </td>
##    <td style="text-align:right;"> 1.920000e-01 </td>
##    <td style="text-align:right;"> 0.310 </td>
##    <td style="text-align:right;"> 0.353 </td>
##    <td style="text-align:right;"> 0.163 </td>
##    <td style="text-align:right;"> 7.000000e-02 </td>
##    <td style="text-align:right;"> 9.300000e-01 </td>
##    <td style="text-align:right;"> 8.600000e-01 </td>
##    <td style="text-align:right;"> 0.731 </td>
##    <td style="text-align:right;"> -0.054 </td>
##    <td style="text-align:right;"> 2.400000e-02 </td>
##    <td style="text-align:right;"> 0.260 </td>
##    <td style="text-align:right;"> 0.240 </td>
##    <td style="text-align:right;"> 0.500 </td>
##   </tr>
##   <tr>
##    <td style="text-align:left;"> AdjPxDays.y.2. </td>
##    <td style="text-align:right;"> 70 </td>
##    <td style="text-align:right;"> 65 </td>
##    <td style="text-align:right;"> 3.982000e+00 </td>
##    <td style="text-align:right;"> 3.184000e+00 </td>
##    <td style="text-align:right;"> 3.326 </td>
##    <td style="text-align:right;"> 3.598 </td>
##    <td style="text-align:right;"> 2.808 </td>
##    <td style="text-align:right;"> 1.340000e-01 </td>
##    <td style="text-align:right;"> 1.718900e+01 </td>
##    <td style="text-align:right;"> 1.705400e+01 </td>
##    <td style="text-align:right;"> 1.450 </td>
##    <td style="text-align:right;"> 3.059 </td>
##    <td style="text-align:right;"> 3.950000e-01 </td>
##    <td style="text-align:right;"> 4.284 </td>
##    <td style="text-align:right;"> 1.541 </td>
##    <td style="text-align:right;"> 5.825 </td>
##   </tr>
##   <tr>
##    <td style="text-align:left;"> Alt1Ohls3.y.2. </td>
##    <td style="text-align:right;"> 71 </td>
##    <td style="text-align:right;"> 65 </td>
##    <td style="text-align:right;"> -1.061963e+08 </td>
##    <td style="text-align:right;"> 8.561822e+08 </td>
##    <td style="text-align:right;"> 0.080 </td>
##    <td style="text-align:right;"> 0.024 </td>
##    <td style="text-align:right;"> 0.237 </td>
##    <td style="text-align:right;"> -6.902761e+09 </td>
##    <td style="text-align:right;"> 4.530000e+00 </td>
##    <td style="text-align:right;"> 6.902761e+09 </td>
##    <td style="text-align:right;"> -7.694 </td>
##    <td style="text-align:right;"> 58.092 </td>
##    <td style="text-align:right;"> 1.061963e+08 </td>
##    <td style="text-align:right;"> 0.310 </td>
##    <td style="text-align:right;"> -0.080 </td>
##    <td style="text-align:right;"> 0.230 </td>
##   </tr>
##   <tr>
##    <td style="text-align:left;"> AltmanX2.y.2. </td>
##    <td style="text-align:right;"> 72 </td>
##    <td style="text-align:right;"> 65 </td>
##    <td style="text-align:right;"> -2.520210e+07 </td>
##    <td style="text-align:right;"> 2.031859e+08 </td>
##    <td style="text-align:right;"> 0.000 </td>
##    <td style="text-align:right;"> -0.033 </td>
##    <td style="text-align:right;"> 0.222 </td>
##    <td style="text-align:right;"> -1.638137e+09 </td>
##    <td style="text-align:right;"> 7.170000e+00 </td>
##    <td style="text-align:right;"> 1.638137e+09 </td>
##    <td style="text-align:right;"> -7.694 </td>
##    <td style="text-align:right;"> 58.092 </td>
##    <td style="text-align:right;"> 2.520210e+07 </td>
##    <td style="text-align:right;"> 0.270 </td>
##    <td style="text-align:right;"> -0.150 </td>
##    <td style="text-align:right;"> 0.120 </td>
##   </tr>
##   <tr>
##    <td style="text-align:left;"> AltmanX3.y.2. </td>
##    <td style="text-align:right;"> 73 </td>
##    <td style="text-align:right;"> 65 </td>
##    <td style="text-align:right;"> -5.330247e+07 </td>
##    <td style="text-align:right;"> 4.297382e+08 </td>
##    <td style="text-align:right;"> -0.010 </td>
##    <td style="text-align:right;"> -0.052 </td>
##    <td style="text-align:right;"> 0.163 </td>
##    <td style="text-align:right;"> -3.464660e+09 </td>
##    <td style="text-align:right;"> 6.400000e-01 </td>
##    <td style="text-align:right;"> 3.464660e+09 </td>
##    <td style="text-align:right;"> -7.694 </td>
##    <td style="text-align:right;"> 58.092 </td>
##    <td style="text-align:right;"> 5.330247e+07 </td>
##    <td style="text-align:right;"> 0.230 </td>
##    <td style="text-align:right;"> -0.160 </td>
##    <td style="text-align:right;"> 0.070 </td>
##   </tr>
##   <tr>
##    <td style="text-align:left;"> AltmanX4.y.2. </td>
##    <td style="text-align:right;"> 74 </td>
##    <td style="text-align:right;"> 65 </td>
##    <td style="text-align:right;"> -7.971323e+07 </td>
##    <td style="text-align:right;"> 1.969878e+09 </td>
##    <td style="text-align:right;"> 0.000 </td>
##    <td style="text-align:right;"> 0.953 </td>
##    <td style="text-align:right;"> 0.193 </td>
##    <td style="text-align:right;"> -9.627826e+09 </td>
##    <td style="text-align:right;"> 4.860965e+09 </td>
##    <td style="text-align:right;"> 1.448879e+10 </td>
##    <td style="text-align:right;"> -2.322 </td>
##    <td style="text-align:right;"> 10.974 </td>
##    <td style="text-align:right;"> 2.443333e+08 </td>
##    <td style="text-align:right;"> 0.260 </td>
##    <td style="text-align:right;"> -0.130 </td>
##    <td style="text-align:right;"> 0.130 </td>
##   </tr>
##   <tr>
##    <td style="text-align:left;"> OhlsonX1.y.2. </td>
##    <td style="text-align:right;"> 75 </td>
##    <td style="text-align:right;"> 65 </td>
##    <td style="text-align:right;"> 1.063300e+01 </td>
##    <td style="text-align:right;"> 2.929000e+00 </td>
##    <td style="text-align:right;"> 11.060 </td>
##    <td style="text-align:right;"> 10.996 </td>
##    <td style="text-align:right;"> 1.127 </td>
##    <td style="text-align:right;"> -1.115000e+01 </td>
##    <td style="text-align:right;"> 1.277000e+01 </td>
##    <td style="text-align:right;"> 2.392000e+01 </td>
##    <td style="text-align:right;"> -6.305 </td>
##    <td style="text-align:right;"> 44.124 </td>
##    <td style="text-align:right;"> 3.630000e-01 </td>
##    <td style="text-align:right;"> 1.380 </td>
##    <td style="text-align:right;"> 10.280 </td>
##    <td style="text-align:right;"> 11.660 </td>
##   </tr>
##   <tr>
##    <td style="text-align:left;"> OhlsonX2.y.2. </td>
##    <td style="text-align:right;"> 76 </td>
##    <td style="text-align:right;"> 65 </td>
##    <td style="text-align:right;"> 1.036536e+08 </td>
##    <td style="text-align:right;"> 8.356820e+08 </td>
##    <td style="text-align:right;"> 0.740 </td>
##    <td style="text-align:right;"> 0.788 </td>
##    <td style="text-align:right;"> 0.578 </td>
##    <td style="text-align:right;"> -4.200000e+00 </td>
##    <td style="text-align:right;"> 6.737484e+09 </td>
##    <td style="text-align:right;"> 6.737484e+09 </td>
##    <td style="text-align:right;"> 7.694 </td>
##    <td style="text-align:right;"> 58.092 </td>
##    <td style="text-align:right;"> 1.036536e+08 </td>
##    <td style="text-align:right;"> 0.760 </td>
##    <td style="text-align:right;"> 0.370 </td>
##    <td style="text-align:right;"> 1.130 </td>
##   </tr>
##   <tr>
##    <td style="text-align:left;"> OhlsonX4.y.2. </td>
##    <td style="text-align:right;"> 77 </td>
##    <td style="text-align:right;"> 65 </td>
##    <td style="text-align:right;"> 2.627500e+01 </td>
##    <td style="text-align:right;"> 2.078770e+02 </td>
##    <td style="text-align:right;"> 0.700 </td>
##    <td style="text-align:right;"> 0.944 </td>
##    <td style="text-align:right;"> 0.712 </td>
##    <td style="text-align:right;"> -3.233000e+01 </td>
##    <td style="text-align:right;"> 1.675990e+03 </td>
##    <td style="text-align:right;"> 1.708320e+03 </td>
##    <td style="text-align:right;"> 7.687 </td>
##    <td style="text-align:right;"> 58.023 </td>
##    <td style="text-align:right;"> 2.578400e+01 </td>
##    <td style="text-align:right;"> 0.950 </td>
##    <td style="text-align:right;"> 0.320 </td>
##    <td style="text-align:right;"> 1.270 </td>
##   </tr>
##   <tr>
##    <td style="text-align:left;"> OhlsonX6.y.2. </td>
##    <td style="text-align:right;"> 78 </td>
##    <td style="text-align:right;"> 65 </td>
##    <td style="text-align:right;"> -4.155330e+07 </td>
##    <td style="text-align:right;"> 3.350134e+08 </td>
##    <td style="text-align:right;"> 0.000 </td>
##    <td style="text-align:right;"> -0.020 </td>
##    <td style="text-align:right;"> 0.133 </td>
##    <td style="text-align:right;"> -2.700965e+09 </td>
##    <td style="text-align:right;"> 6.400000e-01 </td>
##    <td style="text-align:right;"> 2.700965e+09 </td>
##    <td style="text-align:right;"> -7.694 </td>
##    <td style="text-align:right;"> 58.092 </td>
##    <td style="text-align:right;"> 4.155330e+07 </td>
##    <td style="text-align:right;"> 0.190 </td>
##    <td style="text-align:right;"> -0.130 </td>
##    <td style="text-align:right;"> 0.060 </td>
##   </tr>
##   <tr>
##    <td style="text-align:left;"> OhlsonX7.y.2. </td>
##    <td style="text-align:right;"> 79 </td>
##    <td style="text-align:right;"> 65 </td>
##    <td style="text-align:right;"> 2.484816e+08 </td>
##    <td style="text-align:right;"> 8.655635e+08 </td>
##    <td style="text-align:right;"> -0.030 </td>
##    <td style="text-align:right;"> 14021543.385 </td>
##    <td style="text-align:right;"> 0.208 </td>
##    <td style="text-align:right;"> -2.206207e+08 </td>
##    <td style="text-align:right;"> 4.385387e+09 </td>
##    <td style="text-align:right;"> 4.606007e+09 </td>
##    <td style="text-align:right;"> 3.678 </td>
##    <td style="text-align:right;"> 13.142 </td>
##    <td style="text-align:right;"> 1.073599e+08 </td>
##    <td style="text-align:right;"> 0.330 </td>
##    <td style="text-align:right;"> -0.240 </td>
##    <td style="text-align:right;"> 0.090 </td>
##   </tr>
##   <tr>
##    <td style="text-align:left;"> OhlsonX9.y.2. </td>
##    <td style="text-align:right;"> 80 </td>
##    <td style="text-align:right;"> 65 </td>
##    <td style="text-align:right;"> -1.616474e+06 </td>
##    <td style="text-align:right;"> 4.254487e+07 </td>
##    <td style="text-align:right;"> 131891.000 </td>
##    <td style="text-align:right;"> -874270.755 </td>
##    <td style="text-align:right;"> 8117512.246 </td>
##    <td style="text-align:right;"> -1.457655e+08 </td>
##    <td style="text-align:right;"> 1.671678e+08 </td>
##    <td style="text-align:right;"> 3.129332e+08 </td>
##    <td style="text-align:right;"> 0.174 </td>
##    <td style="text-align:right;"> 4.608 </td>
##    <td style="text-align:right;"> 5.277041e+06 </td>
##    <td style="text-align:right;"> 9791674.000 </td>
##    <td style="text-align:right;"> -5343296.000 </td>
##    <td style="text-align:right;"> 4448378.000 </td>
##   </tr>
##   <tr>
##    <td style="text-align:left;"> OhlsonX5.y.2. </td>
##    <td style="text-align:right;"> 81 </td>
##    <td style="text-align:right;"> 65 </td>
##    <td style="text-align:right;"> 3.380000e-01 </td>
##    <td style="text-align:right;"> 4.770000e-01 </td>
##    <td style="text-align:right;"> 0.000 </td>
##    <td style="text-align:right;"> 0.302 </td>
##    <td style="text-align:right;"> 0.000 </td>
##    <td style="text-align:right;"> 0.000000e+00 </td>
##    <td style="text-align:right;"> 1.000000e+00 </td>
##    <td style="text-align:right;"> 1.000000e+00 </td>
##    <td style="text-align:right;"> 0.667 </td>
##    <td style="text-align:right;"> -1.579 </td>
##    <td style="text-align:right;"> 5.900000e-02 </td>
##    <td style="text-align:right;"> 1.000 </td>
##    <td style="text-align:right;"> 0.000 </td>
##    <td style="text-align:right;"> 1.000 </td>
##   </tr>
##   <tr>
##    <td style="text-align:left;"> OhlsonX8.y.2. </td>
##    <td style="text-align:right;"> 82 </td>
##    <td style="text-align:right;"> 65 </td>
##    <td style="text-align:right;"> 4.620000e-01 </td>
##    <td style="text-align:right;"> 5.020000e-01 </td>
##    <td style="text-align:right;"> 0.000 </td>
##    <td style="text-align:right;"> 0.453 </td>
##    <td style="text-align:right;"> 0.000 </td>
##    <td style="text-align:right;"> 0.000000e+00 </td>
##    <td style="text-align:right;"> 1.000000e+00 </td>
##    <td style="text-align:right;"> 1.000000e+00 </td>
##    <td style="text-align:right;"> 0.151 </td>
##    <td style="text-align:right;"> -2.007 </td>
##    <td style="text-align:right;"> 6.200000e-02 </td>
##    <td style="text-align:right;"> 1.000 </td>
##    <td style="text-align:right;"> 0.000 </td>
##    <td style="text-align:right;"> 1.000 </td>
##   </tr>
##   <tr>
##    <td style="text-align:left;"> D_AR_by_OpIncome </td>
##    <td style="text-align:right;"> 83 </td>
##    <td style="text-align:right;"> 65 </td>
##    <td style="text-align:right;"> 4.130000e+00 </td>
##    <td style="text-align:right;"> 1.063000e+01 </td>
##    <td style="text-align:right;"> 0.013 </td>
##    <td style="text-align:right;"> 1.992 </td>
##    <td style="text-align:right;"> 0.893 </td>
##    <td style="text-align:right;"> -9.890000e-01 </td>
##    <td style="text-align:right;"> 7.190000e+01 </td>
##    <td style="text-align:right;"> 7.288900e+01 </td>
##    <td style="text-align:right;"> 4.250 </td>
##    <td style="text-align:right;"> 22.865 </td>
##    <td style="text-align:right;"> 1.318000e+00 </td>
##    <td style="text-align:right;"> 3.013 </td>
##    <td style="text-align:right;"> -0.324 </td>
##    <td style="text-align:right;"> 2.690 </td>
##   </tr>
##   <tr>
##    <td style="text-align:left;"> D_FB_Plus_OpInc_ByFB </td>
##    <td style="text-align:right;"> 84 </td>
##    <td style="text-align:right;"> 65 </td>
##    <td style="text-align:right;"> 8.182000e+00 </td>
##    <td style="text-align:right;"> 7.766200e+01 </td>
##    <td style="text-align:right;"> -0.145 </td>
##    <td style="text-align:right;"> -0.446 </td>
##    <td style="text-align:right;"> 0.319 </td>
##    <td style="text-align:right;"> -3.377800e+01 </td>
##    <td style="text-align:right;"> 6.228300e+02 </td>
##    <td style="text-align:right;"> 6.566080e+02 </td>
##    <td style="text-align:right;"> 7.621 </td>
##    <td style="text-align:right;"> 57.363 </td>
##    <td style="text-align:right;"> 9.633000e+00 </td>
##    <td style="text-align:right;"> 0.592 </td>
##    <td style="text-align:right;"> -0.615 </td>
##    <td style="text-align:right;"> -0.023 </td>
##   </tr>
##   <tr>
##    <td style="text-align:left;"> D_CurrentRatio </td>
##    <td style="text-align:right;"> 85 </td>
##    <td style="text-align:right;"> 65 </td>
##    <td style="text-align:right;"> -1.460000e-01 </td>
##    <td style="text-align:right;"> 9.850000e-01 </td>
##    <td style="text-align:right;"> -0.228 </td>
##    <td style="text-align:right;"> -0.255 </td>
##    <td style="text-align:right;"> 0.337 </td>
##    <td style="text-align:right;"> -3.500000e+00 </td>
##    <td style="text-align:right;"> 3.304000e+00 </td>
##    <td style="text-align:right;"> 6.804000e+00 </td>
##    <td style="text-align:right;"> 1.152 </td>
##    <td style="text-align:right;"> 5.322 </td>
##    <td style="text-align:right;"> 1.220000e-01 </td>
##    <td style="text-align:right;"> 0.448 </td>
##    <td style="text-align:right;"> -0.448 </td>
##    <td style="text-align:right;"> 0.000 </td>
##   </tr>
##   <tr>
##    <td style="text-align:left;"> D_Debt2Equity </td>
##    <td style="text-align:right;"> 86 </td>
##    <td style="text-align:right;"> 65 </td>
##    <td style="text-align:right;"> -9.021000e+00 </td>
##    <td style="text-align:right;"> 9.492700e+01 </td>
##    <td style="text-align:right;"> 0.000 </td>
##    <td style="text-align:right;"> -0.063 </td>
##    <td style="text-align:right;"> 0.539 </td>
##    <td style="text-align:right;"> -7.519770e+02 </td>
##    <td style="text-align:right;"> 1.195000e+02 </td>
##    <td style="text-align:right;"> 8.714770e+02 </td>
##    <td style="text-align:right;"> -7.334 </td>
##    <td style="text-align:right;"> 54.781 </td>
##    <td style="text-align:right;"> 1.177400e+01 </td>
##    <td style="text-align:right;"> 0.697 </td>
##    <td style="text-align:right;"> -0.363 </td>
##    <td style="text-align:right;"> 0.333 </td>
##   </tr>
##   <tr>
##    <td style="text-align:left;"> D_LiabFundBalRatio </td>
##    <td style="text-align:right;"> 87 </td>
##    <td style="text-align:right;"> 65 </td>
##    <td style="text-align:right;"> -1.186300e+01 </td>
##    <td style="text-align:right;"> 9.607500e+01 </td>
##    <td style="text-align:right;"> -0.066 </td>
##    <td style="text-align:right;"> -0.213 </td>
##    <td style="text-align:right;"> 0.786 </td>
##    <td style="text-align:right;"> -7.742250e+02 </td>
##    <td style="text-align:right;"> 1.800000e+01 </td>
##    <td style="text-align:right;"> 7.922250e+02 </td>
##    <td style="text-align:right;"> -7.684 </td>
##    <td style="text-align:right;"> 57.994 </td>
##    <td style="text-align:right;"> 1.191700e+01 </td>
##    <td style="text-align:right;"> 1.044 </td>
##    <td style="text-align:right;"> -0.700 </td>
##    <td style="text-align:right;"> 0.344 </td>
##   </tr>
##   <tr>
##    <td style="text-align:left;"> D_DaysSalesOutstanding </td>
##    <td style="text-align:right;"> 88 </td>
##    <td style="text-align:right;"> 65 </td>
##    <td style="text-align:right;"> 4.010000e-01 </td>
##    <td style="text-align:right;"> 2.570000e+00 </td>
##    <td style="text-align:right;"> -0.028 </td>
##    <td style="text-align:right;"> -0.022 </td>
##    <td style="text-align:right;"> 0.192 </td>
##    <td style="text-align:right;"> -7.240000e-01 </td>
##    <td style="text-align:right;"> 1.969300e+01 </td>
##    <td style="text-align:right;"> 2.041700e+01 </td>
##    <td style="text-align:right;"> 6.629 </td>
##    <td style="text-align:right;"> 46.044 </td>
##    <td style="text-align:right;"> 3.190000e-01 </td>
##    <td style="text-align:right;"> 0.266 </td>
##    <td style="text-align:right;"> -0.165 </td>
##    <td style="text-align:right;"> 0.100 </td>
##   </tr>
##   <tr>
##    <td style="text-align:left;"> D_LaborCompRatio </td>
##    <td style="text-align:right;"> 89 </td>
##    <td style="text-align:right;"> 65 </td>
##    <td style="text-align:right;"> 1.070000e-01 </td>
##    <td style="text-align:right;"> 6.600000e-01 </td>
##    <td style="text-align:right;"> 0.000 </td>
##    <td style="text-align:right;"> 0.009 </td>
##    <td style="text-align:right;"> 0.096 </td>
##    <td style="text-align:right;"> -3.440000e-01 </td>
##    <td style="text-align:right;"> 5.096000e+00 </td>
##    <td style="text-align:right;"> 5.441000e+00 </td>
##    <td style="text-align:right;"> 6.709 </td>
##    <td style="text-align:right;"> 47.373 </td>
##    <td style="text-align:right;"> 8.200000e-02 </td>
##    <td style="text-align:right;"> 0.128 </td>
##    <td style="text-align:right;"> -0.063 </td>
##    <td style="text-align:right;"> 0.065 </td>
##   </tr>
##   <tr>
##    <td style="text-align:left;"> D_OpProfitMargin </td>
##    <td style="text-align:right;"> 90 </td>
##    <td style="text-align:right;"> 65 </td>
##    <td style="text-align:right;"> 1.500000e-02 </td>
##    <td style="text-align:right;"> 2.063000e+00 </td>
##    <td style="text-align:right;"> -0.125 </td>
##    <td style="text-align:right;"> -0.051 </td>
##    <td style="text-align:right;"> 0.772 </td>
##    <td style="text-align:right;"> -7.000000e+00 </td>
##    <td style="text-align:right;"> 9.356000e+00 </td>
##    <td style="text-align:right;"> 1.635600e+01 </td>
##    <td style="text-align:right;"> 0.913 </td>
##    <td style="text-align:right;"> 7.131 </td>
##    <td style="text-align:right;"> 2.560000e-01 </td>
##    <td style="text-align:right;"> 1.053 </td>
##    <td style="text-align:right;"> -0.636 </td>
##    <td style="text-align:right;"> 0.417 </td>
##   </tr>
##   <tr>
##    <td style="text-align:left;"> D_DaysCashOnHand </td>
##    <td style="text-align:right;"> 91 </td>
##    <td style="text-align:right;"> 65 </td>
##    <td style="text-align:right;"> 3.919000e+01 </td>
##    <td style="text-align:right;"> 2.501270e+02 </td>
##    <td style="text-align:right;"> -0.114 </td>
##    <td style="text-align:right;"> 0.044 </td>
##    <td style="text-align:right;"> 0.867 </td>
##    <td style="text-align:right;"> -1.558300e+01 </td>
##    <td style="text-align:right;"> 1.936500e+03 </td>
##    <td style="text-align:right;"> 1.952083e+03 </td>
##    <td style="text-align:right;"> 6.879 </td>
##    <td style="text-align:right;"> 48.307 </td>
##    <td style="text-align:right;"> 3.102400e+01 </td>
##    <td style="text-align:right;"> 1.226 </td>
##    <td style="text-align:right;"> -0.675 </td>
##    <td style="text-align:right;"> 0.551 </td>
##   </tr>
##   <tr>
##    <td style="text-align:left;"> D_BedUtil </td>
##    <td style="text-align:right;"> 92 </td>
##    <td style="text-align:right;"> 65 </td>
##    <td style="text-align:right;"> 4.100000e-02 </td>
##    <td style="text-align:right;"> 5.200000e-01 </td>
##    <td style="text-align:right;"> -0.036 </td>
##    <td style="text-align:right;"> -0.020 </td>
##    <td style="text-align:right;"> 0.082 </td>
##    <td style="text-align:right;"> -5.910000e-01 </td>
##    <td style="text-align:right;"> 3.857000e+00 </td>
##    <td style="text-align:right;"> 4.448000e+00 </td>
##    <td style="text-align:right;"> 6.073 </td>
##    <td style="text-align:right;"> 41.898 </td>
##    <td style="text-align:right;"> 6.400000e-02 </td>
##    <td style="text-align:right;"> 0.134 </td>
##    <td style="text-align:right;"> -0.091 </td>
##    <td style="text-align:right;"> 0.043 </td>
##   </tr>
##   <tr>
##    <td style="text-align:left;"> D_AdjPxDays </td>
##    <td style="text-align:right;"> 93 </td>
##    <td style="text-align:right;"> 65 </td>
##    <td style="text-align:right;"> -4.000000e-03 </td>
##    <td style="text-align:right;"> 2.350000e-01 </td>
##    <td style="text-align:right;"> -0.014 </td>
##    <td style="text-align:right;"> -0.014 </td>
##    <td style="text-align:right;"> 0.102 </td>
##    <td style="text-align:right;"> -8.130000e-01 </td>
##    <td style="text-align:right;"> 1.154000e+00 </td>
##    <td style="text-align:right;"> 1.967000e+00 </td>
##    <td style="text-align:right;"> 1.341 </td>
##    <td style="text-align:right;"> 9.371 </td>
##    <td style="text-align:right;"> 2.900000e-02 </td>
##    <td style="text-align:right;"> 0.124 </td>
##    <td style="text-align:right;"> -0.070 </td>
##    <td style="text-align:right;"> 0.055 </td>
##   </tr>
##   <tr>
##    <td style="text-align:left;"> D_Alt1Ohls3 </td>
##    <td style="text-align:right;"> 94 </td>
##    <td style="text-align:right;"> 65 </td>
##    <td style="text-align:right;"> 1.700000e-01 </td>
##    <td style="text-align:right;"> 2.427000e+00 </td>
##    <td style="text-align:right;"> 0.125 </td>
##    <td style="text-align:right;"> 0.110 </td>
##    <td style="text-align:right;"> 0.803 </td>
##    <td style="text-align:right;"> -8.286000e+00 </td>
##    <td style="text-align:right;"> 1.366700e+01 </td>
##    <td style="text-align:right;"> 2.195200e+01 </td>
##    <td style="text-align:right;"> 1.955 </td>
##    <td style="text-align:right;"> 14.977 </td>
##    <td style="text-align:right;"> 3.010000e-01 </td>
##    <td style="text-align:right;"> 1.072 </td>
##    <td style="text-align:right;"> -0.455 </td>
##    <td style="text-align:right;"> 0.618 </td>
##   </tr>
##   <tr>
##    <td style="text-align:left;"> D_AltmanX2 </td>
##    <td style="text-align:right;"> 95 </td>
##    <td style="text-align:right;"> 65 </td>
##    <td style="text-align:right;"> -6.170000e-01 </td>
##    <td style="text-align:right;"> 4.192000e+00 </td>
##    <td style="text-align:right;"> -0.489 </td>
##    <td style="text-align:right;"> -0.629 </td>
##    <td style="text-align:right;"> 1.129 </td>
##    <td style="text-align:right;"> -1.863600e+01 </td>
##    <td style="text-align:right;"> 1.700000e+01 </td>
##    <td style="text-align:right;"> 3.563600e+01 </td>
##    <td style="text-align:right;"> -0.024 </td>
##    <td style="text-align:right;"> 8.146 </td>
##    <td style="text-align:right;"> 5.200000e-01 </td>
##    <td style="text-align:right;"> 1.630 </td>
##    <td style="text-align:right;"> -1.407 </td>
##    <td style="text-align:right;"> 0.222 </td>
##   </tr>
##   <tr>
##    <td style="text-align:left;"> D_AltmanX3 </td>
##    <td style="text-align:right;"> 96 </td>
##    <td style="text-align:right;"> 65 </td>
##    <td style="text-align:right;"> -7.590000e-01 </td>
##    <td style="text-align:right;"> 3.236000e+00 </td>
##    <td style="text-align:right;"> -0.286 </td>
##    <td style="text-align:right;"> -0.438 </td>
##    <td style="text-align:right;"> 0.819 </td>
##    <td style="text-align:right;"> -2.100000e+01 </td>
##    <td style="text-align:right;"> 8.000000e+00 </td>
##    <td style="text-align:right;"> 2.900000e+01 </td>
##    <td style="text-align:right;"> -3.510 </td>
##    <td style="text-align:right;"> 21.874 </td>
##    <td style="text-align:right;"> 4.010000e-01 </td>
##    <td style="text-align:right;"> 1.161 </td>
##    <td style="text-align:right;"> -1.000 </td>
##    <td style="text-align:right;"> 0.161 </td>
##   </tr>
##   <tr>
##    <td style="text-align:left;"> D_AltmanX4 </td>
##    <td style="text-align:right;"> 97 </td>
##    <td style="text-align:right;"> 65 </td>
##    <td style="text-align:right;"> 4.108209e+07 </td>
##    <td style="text-align:right;"> 2.931489e+08 </td>
##    <td style="text-align:right;"> -0.625 </td>
##    <td style="text-align:right;"> -0.984 </td>
##    <td style="text-align:right;"> 1.112 </td>
##    <td style="text-align:right;"> -4.214563e+07 </td>
##    <td style="text-align:right;"> 2.338349e+09 </td>
##    <td style="text-align:right;"> 2.380494e+09 </td>
##    <td style="text-align:right;"> 7.423 </td>
##    <td style="text-align:right;"> 55.046 </td>
##    <td style="text-align:right;"> 3.636065e+07 </td>
##    <td style="text-align:right;"> 1.563 </td>
##    <td style="text-align:right;"> -1.480 </td>
##    <td style="text-align:right;"> 0.083 </td>
##   </tr>
##   <tr>
##    <td style="text-align:left;"> D_OhlsonX1 </td>
##    <td style="text-align:right;"> 98 </td>
##    <td style="text-align:right;"> 65 </td>
##    <td style="text-align:right;"> -1.000000e-03 </td>
##    <td style="text-align:right;"> 3.600000e-02 </td>
##    <td style="text-align:right;"> -0.005 </td>
##    <td style="text-align:right;"> -0.005 </td>
##    <td style="text-align:right;"> 0.009 </td>
##    <td style="text-align:right;"> -4.600000e-02 </td>
##    <td style="text-align:right;"> 2.540000e-01 </td>
##    <td style="text-align:right;"> 3.000000e-01 </td>
##    <td style="text-align:right;"> 5.419 </td>
##    <td style="text-align:right;"> 35.364 </td>
##    <td style="text-align:right;"> 4.000000e-03 </td>
##    <td style="text-align:right;"> 0.012 </td>
##    <td style="text-align:right;"> -0.011 </td>
##    <td style="text-align:right;"> 0.001 </td>
##   </tr>
##   <tr>
##    <td style="text-align:left;"> D_OhlsonX2 </td>
##    <td style="text-align:right;"> 99 </td>
##    <td style="text-align:right;"> 65 </td>
##    <td style="text-align:right;"> 6.160000e-01 </td>
##    <td style="text-align:right;"> 2.999000e+00 </td>
##    <td style="text-align:right;"> 0.117 </td>
##    <td style="text-align:right;"> 0.170 </td>
##    <td style="text-align:right;"> 0.175 </td>
##    <td style="text-align:right;"> -3.333000e+00 </td>
##    <td style="text-align:right;"> 2.200000e+01 </td>
##    <td style="text-align:right;"> 2.533300e+01 </td>
##    <td style="text-align:right;"> 5.734 </td>
##    <td style="text-align:right;"> 37.296 </td>
##    <td style="text-align:right;"> 3.720000e-01 </td>
##    <td style="text-align:right;"> 0.234 </td>
##    <td style="text-align:right;"> 0.000 </td>
##    <td style="text-align:right;"> 0.234 </td>
##   </tr>
##   <tr>
##    <td style="text-align:left;"> D_OhlsonX4 </td>
##    <td style="text-align:right;"> 100 </td>
##    <td style="text-align:right;"> 65 </td>
##    <td style="text-align:right;"> 1.637000e+00 </td>
##    <td style="text-align:right;"> 6.192000e+00 </td>
##    <td style="text-align:right;"> 0.231 </td>
##    <td style="text-align:right;"> 0.411 </td>
##    <td style="text-align:right;"> 0.518 </td>
##    <td style="text-align:right;"> -3.613000e+00 </td>
##    <td style="text-align:right;"> 4.100000e+01 </td>
##    <td style="text-align:right;"> 4.461300e+01 </td>
##    <td style="text-align:right;"> 4.928 </td>
##    <td style="text-align:right;"> 25.916 </td>
##    <td style="text-align:right;"> 7.680000e-01 </td>
##    <td style="text-align:right;"> 0.677 </td>
##    <td style="text-align:right;"> -0.055 </td>
##    <td style="text-align:right;"> 0.621 </td>
##   </tr>
##   <tr>
##    <td style="text-align:left;"> D_OhlsonX6 </td>
##    <td style="text-align:right;"> 101 </td>
##    <td style="text-align:right;"> 65 </td>
##    <td style="text-align:right;"> -5.800000e-01 </td>
##    <td style="text-align:right;"> 3.013000e+00 </td>
##    <td style="text-align:right;"> -0.379 </td>
##    <td style="text-align:right;"> -0.316 </td>
##    <td style="text-align:right;"> 1.003 </td>
##    <td style="text-align:right;"> -1.400000e+01 </td>
##    <td style="text-align:right;"> 6.000000e+00 </td>
##    <td style="text-align:right;"> 2.000000e+01 </td>
##    <td style="text-align:right;"> -1.624 </td>
##    <td style="text-align:right;"> 5.875 </td>
##    <td style="text-align:right;"> 3.740000e-01 </td>
##    <td style="text-align:right;"> 1.300 </td>
##    <td style="text-align:right;"> -1.000 </td>
##    <td style="text-align:right;"> 0.300 </td>
##   </tr>
##   <tr>
##    <td style="text-align:left;"> D_OhlsonX7 </td>
##    <td style="text-align:right;"> 102 </td>
##    <td style="text-align:right;"> 65 </td>
##    <td style="text-align:right;"> 3.733978e+07 </td>
##    <td style="text-align:right;"> 2.676257e+08 </td>
##    <td style="text-align:right;"> -0.300 </td>
##    <td style="text-align:right;"> -0.471 </td>
##    <td style="text-align:right;"> 0.750 </td>
##    <td style="text-align:right;"> -2.400000e+01 </td>
##    <td style="text-align:right;"> 2.147964e+09 </td>
##    <td style="text-align:right;"> 2.147964e+09 </td>
##    <td style="text-align:right;"> 7.551 </td>
##    <td style="text-align:right;"> 56.520 </td>
##    <td style="text-align:right;"> 3.319488e+07 </td>
##    <td style="text-align:right;"> 1.116 </td>
##    <td style="text-align:right;"> -1.000 </td>
##    <td style="text-align:right;"> 0.116 </td>
##   </tr>
##   <tr>
##    <td style="text-align:left;"> D_OhlsonX9 </td>
##    <td style="text-align:right;"> 103 </td>
##    <td style="text-align:right;"> 65 </td>
##    <td style="text-align:right;"> -9.480000e-01 </td>
##    <td style="text-align:right;"> 4.933000e+00 </td>
##    <td style="text-align:right;"> -0.583 </td>
##    <td style="text-align:right;"> -0.848 </td>
##    <td style="text-align:right;"> 1.120 </td>
##    <td style="text-align:right;"> -1.958700e+01 </td>
##    <td style="text-align:right;"> 2.073500e+01 </td>
##    <td style="text-align:right;"> 4.032200e+01 </td>
##    <td style="text-align:right;"> 0.299 </td>
##    <td style="text-align:right;"> 8.323 </td>
##    <td style="text-align:right;"> 6.120000e-01 </td>
##    <td style="text-align:right;"> 1.639 </td>
##    <td style="text-align:right;"> -1.520 </td>
##    <td style="text-align:right;"> 0.119 </td>
##   </tr>
##   <tr>
##    <td style="text-align:left;"> NegLiab.y.1. </td>
##    <td style="text-align:right;"> 104 </td>
##    <td style="text-align:right;"> 65 </td>
##    <td style="text-align:right;"> 1.540000e-01 </td>
##    <td style="text-align:right;"> 3.640000e-01 </td>
##    <td style="text-align:right;"> 0.000 </td>
##    <td style="text-align:right;"> 0.075 </td>
##    <td style="text-align:right;"> 0.000 </td>
##    <td style="text-align:right;"> 0.000000e+00 </td>
##    <td style="text-align:right;"> 1.000000e+00 </td>
##    <td style="text-align:right;"> 1.000000e+00 </td>
##    <td style="text-align:right;"> 1.875 </td>
##    <td style="text-align:right;"> 1.539 </td>
##    <td style="text-align:right;"> 4.500000e-02 </td>
##    <td style="text-align:right;"> 0.000 </td>
##    <td style="text-align:right;"> 0.000 </td>
##    <td style="text-align:right;"> 0.000 </td>
##   </tr>
##   <tr>
##    <td style="text-align:left;"> NegLiab.y.2. </td>
##    <td style="text-align:right;"> 105 </td>
##    <td style="text-align:right;"> 65 </td>
##    <td style="text-align:right;"> 1.230000e-01 </td>
##    <td style="text-align:right;"> 3.310000e-01 </td>
##    <td style="text-align:right;"> 0.000 </td>
##    <td style="text-align:right;"> 0.038 </td>
##    <td style="text-align:right;"> 0.000 </td>
##    <td style="text-align:right;"> 0.000000e+00 </td>
##    <td style="text-align:right;"> 1.000000e+00 </td>
##    <td style="text-align:right;"> 1.000000e+00 </td>
##    <td style="text-align:right;"> 2.242 </td>
##    <td style="text-align:right;"> 3.074 </td>
##    <td style="text-align:right;"> 4.100000e-02 </td>
##    <td style="text-align:right;"> 0.000 </td>
##    <td style="text-align:right;"> 0.000 </td>
##    <td style="text-align:right;"> 0.000 </td>
##   </tr>
## </tbody>
## </table>

Counts

# Print the frequency table of the 'Bankrupt' column in the 'bankrupt' data frame
myprint(table(bankrupt$Bankrupt))
## 
##    0    1 
## 3026   65

Correlations

# Extract columns 46 to 57 from the 'bankrupt' data frame
# These columns represent Altman/Ohlson data for the year y-1 and assign it to 'altohls'
altohls <- bankrupt[, 46:57]  # @y-1

# Extract columns 71 to 82 from the 'bankrupt' data frame
# These columns represent data for the year y-2 and assign it to 'altohls2'
altohls2 <- bankrupt[, 71:82]  # @y-2

# Extract columns 34 to 45 from the 'bankrupt' data frame
# These columns represent lagged data for the year y-1 and assign it to 'lag'
lag <- bankrupt[, 34:45]  # @y-1

# Extract columns 59 to 70 from the 'bankrupt' data frame
# These columns represent lagged data for the year y-2 and assign it to 'lag2'
lag2 <- bankrupt[, 59:70]  # @y-2

# Extract columns 83 to 93 from the 'bankrupt' data frame
# These columns represent delta (change) data and assign it to 'delta'
delta <- bankrupt[, 83:93]

# Calculate and plot the correlation matrix for the 'altohls' data frame
corfunction(altohls)

# Calculate and plot the correlation matrix for the 'altohls2' data frame
corfunction(altohls2)

# Calculate and plot the correlation matrix for the 'lag' data frame
corfunction(lag)

# Calculate and plot the correlation matrix for the 'lag2' data frame
corfunction(lag2)

# Calculate and plot the correlation matrix for the 'delta' data frame
corfunction(delta)

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)] 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(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)

# Convert row names to numeric for bankruptcy and non-bankruptcy cases
brpt <- as.numeric(rownames(bankrupt[bankrupt$Bankrupt == 1,])) # bankruptcy cases
nbrpt <- as.numeric(rownames(bankrupt[bankrupt$Bankrupt == 0,])) # non-bankruptcy cases

# Define a function to generate a subsample
mysub <- function(x) {
  tmp1 <- sample(brpt, x * length(brpt)) # bankruptcy sample observations
  tmp2 <- sample(nbrpt, x * length(nbrpt)) # non-bankruptcy sample observations
  tmp <- c(tmp1, tmp2) # conjoined
  return(tmp)
}

# Define a function to create train and test sets based on the sample proportion
create_train_test <- function(sample_proportion) {
  mys <- mysub(sample_proportion)
  train <- bankrupt[mys,] # filtering train set
  test <- bankrupt[-mys,] # filtering test set
  list(train = train, test = test)
}

# Create train and test sets for different sample proportions
data_sets <- list(
  set1 = create_train_test(0.5),
  set2 = create_train_test(0.6),
  set3 = create_train_test(0.7), 
  set4 = create_train_test(0.8), 
  set5 = create_train_test(0.9)
)

# Print tables of the 'Bankrupt' column for train and test sets
for (set_name in names(data_sets)) {
  cat("\n", set_name, ":\n")
  cat("Train:\n")
  print(table(data_sets[[set_name]]$train$Bankrupt))
  cat("Test:\n")
  print(table(data_sets[[set_name]]$test$Bankrupt))
}
## 
##  set1 :
## Train:
## 
##    0    1 
## 1513   32 
## Test:
## 
##    0    1 
## 1513   33 
## 
##  set2 :
## Train:
## 
##    0    1 
## 1815   39 
## Test:
## 
##    0    1 
## 1211   26 
## 
##  set3 :
## Train:
## 
##    0    1 
## 2118   45 
## Test:
## 
##   0   1 
## 908  20 
## 
##  set4 :
## Train:
## 
##    0    1 
## 2420   52 
## Test:
## 
##   0   1 
## 606  13 
## 
##  set5 :
## Train:
## 
##    0    1 
## 2723   58 
## Test:
## 
##   0   1 
## 303   7

Interim Write / Read

write.csv(data_sets$set1$train, 'interim1.csv', row.names=FALSE) #write csv
write.csv(data_sets$set2$train, 'interim2.csv', row.names=FALSE) #write csv
write.csv(data_sets$set3$train, 'interim3.csv', row.names=FALSE) #write csv
write.csv(data_sets$set4$train, 'interim4.csv', row.names=FALSE) #write csv
write.csv(data_sets$set5$train, 'interim5.csv', row.names=FALSE) #write csv

t1=read.csv('interim1.csv',stringsAsFactors = T)
t2=read.csv('interim2.csv',stringsAsFactors = T)
t3=read.csv('interim3.csv',stringsAsFactors = T)
t4=read.csv('interim4.csv', stringsAsFactors = T)
t5=read.csv('interim5.csv', stringsAsFactors = T)

Scale-Not Done for Interpretability

  • We scale only for models requiring it. Specifically, we scale for ElasticNet applied to the training set (3-Fold CV), the Perceptron, and the Support Vector Machine estimates.

Rebalance Training Set

The data are highly imbalanced. We generate observations to learn about bankruptcy. We use mwmote to focus our search on noisy observations.

#Rebalance using mwmote

myrebalance=function(x,n)
{
  tmp1=mwmote(x, numInstances = n*(table(x$Bankrupt)[1]-table(x$Bankrupt)[2]), classAttr = "Bankrupt") #noisy oversample
  return(rbind(x,tmp1))
  
}

train1=myrebalance(t1,1)
train2=myrebalance(t2,1)
train3=myrebalance(t3,1)
train4=myrebalance(t4,1)
train5=myrebalance(t5,1)

test1=data_sets$set1$test
test2=data_sets$set2$test
test3=data_sets$set3$test
test4=data_sets$set4$test
test5=data_sets$set5$test

Describe Rebalanced Sets

# Compute summary statistics for the 'train' data frame
describe(train1, 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.09 3.830000e+00     2014.00
## AR_by_OpIncome               3 3026         2.65 2.390000e+00        1.77
## FB_Plus_OpInc_ByFB           4 3026         0.98 4.170000e+00        0.92
## PercentMedicaidDays          5 3026         0.08 8.000000e-02        0.06
## PercentMedicareDays          6 3026         0.33 1.000000e-01        0.32
## CurrentRatio                 7 3026         4.07 1.291200e+02        1.26
## Debt2Equity                  8 3026        -0.12 1.407000e+01        0.40
## DaysSalesOutstanding         9 3026        50.20 1.050900e+02       46.25
## LaborCompRatio              10 3026         0.54 5.100000e-01        0.45
## OpProfitMargin              11 3026        -0.21 8.900000e-01       -0.09
## DaysCashOnHand              12 3026        29.08 8.792000e+01        6.15
## BedUtil                     13 3026         0.42 1.800000e-01        0.39
## AdjPxDays                   14 3026         6.30 7.760000e+00        4.03
## Alt1Ohls3                   15 3026 -15543542.08 6.202158e+08        0.05
## AltmanX2                    16 3026 -14895313.37 5.466000e+08       -0.03
## AltmanX3                    17 3026  -4122257.49 1.402914e+08       -0.05
## AltmanX4                    18 3026 197149569.93 3.216701e+09       -0.03
## OhlsonX1                    19 3026        11.45 1.830000e+00       11.36
## OhlsonX2                    20 3026 -15587544.67 7.410010e+08        0.64
## OhlsonX4                    21 3026         1.25 3.190000e+00        0.85
## OhlsonX6                    22 3026  -4874910.22 2.245140e+08       -0.03
## OhlsonX7                    23 3026 182056349.36 1.379865e+09       -0.05
## OhlsonX9                    24 3026   6234324.98 9.197613e+07 -1938827.00
## OhlsonX5                    25 3026         0.25 4.300000e-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.06 2.400000e-01        0.00
## ForProfit                   29 3026         0.27 4.500000e-01        0.00
## HC1                         30 3026         0.05 2.100000e-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         2.76 2.360000e+00        2.33
## FB_Plus_OpInc_ByFB.y.1.     35 3026         1.49 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.99 3.123000e+01        1.45
## Debt2Equity.y.1.            39 3026         2.44 9.165000e+01        0.42
## DaysSalesOutstanding.y.1.   40 3026        53.13 9.362000e+01       51.07
## 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.38 9.036000e+01       17.13
## BedUtil.y.1.                44 3026         0.43 1.800000e-01        0.41
## AdjPxDays.y.1.              45 3026         6.33 7.590000e+00        4.19
## Alt1Ohls3.y.1.              46 3026  -8386559.03 3.028840e+08        0.10
## AltmanX2.y.1.               47 3026  -1530142.23 4.786308e+07       -0.02
## AltmanX3.y.1.               48 3026   -968588.38 3.089794e+07       -0.02
## AltmanX4.y.1.               49 3026 141869303.94 1.180996e+09       -0.03
## OhlsonX1.y.1.               50 3026        11.48 1.620000e+00       11.42
## OhlsonX2.y.1.               51 3026   2249494.26 7.625428e+07        0.60
## OhlsonX4.y.1.               52 3026         0.75 4.390000e+00        0.65
## OhlsonX6.y.1.               53 3026  -1176686.92 3.925391e+07       -0.02
## OhlsonX7.y.1.               54 3026 174563393.18 1.293606e+09       -0.03
## OhlsonX9.y.1.               55 3026   4442322.52 1.170925e+08  -924945.75
## OhlsonX5.y.1.               56 3026         0.13 3.400000e-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         2.93 2.280000e+00        2.37
## FB_Plus_OpInc_ByFB.y.2.     60 3026         0.77 7.390000e+00        0.97
## 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.85 8.063000e+01        1.75
## Debt2Equity.y.2.            64 3026        -0.79 7.776000e+01        0.44
## DaysSalesOutstanding.y.2.   65 3026        57.34 6.216000e+01       53.75
## 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        32.40 8.271000e+01       11.88
## BedUtil.y.2.                69 3026         0.44 1.900000e-01        0.41
## AdjPxDays.y.2.              70 3026         6.45 7.470000e+00        4.35
## Alt1Ohls3.y.2.              71 3026 -12078412.96 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.02
## AltmanX4.y.2.               74 3026 127384872.74 1.335519e+09        0.02
## OhlsonX1.y.2.               75 3026        11.51 1.580000e+00       11.45
## OhlsonX2.y.2.               76 3026   2138422.96 7.209015e+07        0.57
## OhlsonX4.y.2.               77 3026         1.37 3.059000e+01        0.59
## OhlsonX6.y.2.               78 3026  -1988280.97 6.520815e+07        0.01
## OhlsonX7.y.2.               79 3026 170260803.88 1.282674e+09        0.04
## OhlsonX9.y.2.               80 3026   8188321.64 1.137156e+08   695093.00
## OhlsonX5.y.2.               81 3026         0.13 3.300000e-01        0.00
## OhlsonX8.y.2.               82 3026         0.19 4.000000e-01        0.00
## D_AR_by_OpIncome            83 3026         3.08 2.401000e+01        0.07
## D_FB_Plus_OpInc_ByFB        84 3026        -0.80 1.004000e+01       -0.17
## D_CurrentRatio              85 3026        -0.22 2.680000e+00       -0.16
## D_Debt2Equity               86 3026         2.13 1.360000e+01        0.06
## D_LiabFundBalRatio          87 3026         0.11 3.840000e+00        0.06
## D_DaysSalesOutstanding      88 3026         0.34 2.320000e+00       -0.04
## D_LaborCompRatio            89 3026         0.08 4.700000e-01        0.01
## D_OpProfitMargin            90 3026         0.08 3.540000e+00        0.08
## D_DaysCashOnHand            91 3026         9.26 3.259300e+02       -0.30
## D_BedUtil                   92 3026         0.04 4.300000e-01       -0.04
## D_AdjPxDays                 93 3026         0.02 1.000000e+00       -0.02
## D_Alt1Ohls3                 94 3026 -32262060.88 1.647339e+09       -0.11
## D_AltmanX2                  95 3026  30896776.76 1.383992e+09       -0.20
## D_AltmanX3                  96 3026  23726494.61 8.334888e+08       -0.36
## D_AltmanX4                  97 3026  86097188.27 8.776262e+09       -0.40
## D_OhlsonX1                  98 3026        -0.01 1.100000e-01        0.00
## D_OhlsonX2                  99 3026  -2802094.37 1.083939e+09        0.06
## D_OhlsonX4                 100 3026         0.41 2.410000e+00        0.19
## D_OhlsonX6                 101 3026  23224066.23 1.021291e+09        0.00
## D_OhlsonX7                 102 3026  32401449.89 1.455388e+09       -0.40
## D_OhlsonX9                 103 3026    696391.83 3.830811e+07       -0.30
## NegLiab.y.1.               104 3026         0.04 1.900000e-01        0.00
## NegLiab.y.2.               105 3026         0.04 2.000000e-01        0.00
##                              trimmed        mad           min          max
## Bankrupt                        0.50       0.74  0.000000e+00 1.000000e+00
## Year                         2014.01       4.45  2.008000e+03 2.021000e+03
## AR_by_OpIncome                  2.36       2.35  0.000000e+00 8.590000e+00
## FB_Plus_OpInc_ByFB              0.73       0.50 -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.39       1.08 -7.011000e+01 7.098050e+03
## Debt2Equity                     0.75       1.01 -2.889400e+02 4.077900e+02
## DaysSalesOutstanding           47.20      13.58 -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.53      11.41 -7.541700e+02 1.623180e+03
## BedUtil                         0.41       0.19  1.000000e-02 1.000000e+00
## AdjPxDays                       4.73       2.59  3.000000e-02 1.258200e+02
## Alt1Ohls3                       0.02       0.24 -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.01       0.23 -2.401988e+10 1.520000e+11
## OhlsonX1                       11.46       1.03 -1.115000e+01 1.724000e+01
## OhlsonX2                        0.68       0.42 -3.619138e+10 2.092522e+09
## OhlsonX4                        1.01       0.77 -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                   -94199.40 6969515.31 -1.177478e+09 2.986955e+09
## OhlsonX5                        0.19       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.             2.52       3.05  0.000000e+00 8.600000e+00
## 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.59       1.05 -7.873100e+02 1.482250e+03
## Debt2Equity.y.1.                0.60       0.64 -6.275700e+02 4.467920e+03
## DaysSalesOutstanding.y.1.      51.93      15.47 -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.98      23.14 -9.288000e+02 1.766670e+03
## BedUtil.y.1.                    0.43       0.18  2.000000e-02 1.000000e+00
## AdjPxDays.y.1.                  4.86       2.67  1.000000e-02 1.415600e+02
## Alt1Ohls3.y.1.                  0.07       0.18 -1.393858e+10 3.015305e+08
## AltmanX2.y.1.                  -0.03       0.10 -1.789527e+09 2.097515e+08
## AltmanX3.y.1.                  -0.04       0.14 -1.542306e+09 4.040000e+00
## AltmanX4.y.1.                  -0.01       0.16 -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.75       0.46 -1.835000e+02 7.136000e+01
## OhlsonX6.y.1.                  -0.03       0.11 -1.789527e+09 2.097517e+08
## OhlsonX7.y.1.                  -0.02       0.25 -7.165679e+09 2.558153e+10
## OhlsonX9.y.1.              606221.21 5313313.35 -1.308272e+09 5.228494e+09
## OhlsonX5.y.1.                   0.04       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.11       0.00  0.000000e+00 1.000000e+00
## AR_by_OpIncome.y.2.             2.72       2.41  1.000000e-02 8.600000e+00
## FB_Plus_OpInc_ByFB.y.2.         0.96       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.88       1.13 -4.556000e+01 4.418520e+03
## Debt2Equity.y.2.                0.57       0.66 -3.255210e+03 4.554200e+02
## DaysSalesOutstanding.y.2.      54.25      14.80 -1.552950e+03 1.711020e+03
## LaborCompRatio.y.2.             0.45       0.11 -1.990000e+00 4.580000e+00
## OpProfitMargin.y.2.            -0.04       0.08 -9.570000e+00 8.190000e+00
## DaysCashOnHand.y.2.            20.11      17.55 -6.907700e+02 1.666270e+03
## BedUtil.y.2.                    0.43       0.19  1.000000e-02 1.000000e+00
## AdjPxDays.y.2.                  5.03       2.75  1.000000e-02 1.372600e+02
## Alt1Ohls3.y.2.                  0.11       0.15 -1.303108e+10 1.649000e+08
## AltmanX2.y.2.                   0.02       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.12       0.16 -2.621151e+10 2.753928e+10
## OhlsonX1.y.2.                  11.51       0.90 -1.115000e+01 1.700000e+01
## OhlsonX2.y.2.                   0.61       0.33 -6.485320e+07 3.187338e+09
## OhlsonX4.y.2.                   0.68       0.39 -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.             2290700.94 5999947.48 -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                1.13       0.90 -1.000000e+00 1.245000e+03
## D_FB_Plus_OpInc_ByFB           -0.66       0.51 -1.540000e+02 4.370000e+02
## D_CurrentRatio                 -0.16       0.33 -1.220000e+02 1.788000e+01
## D_Debt2Equity                   0.27       0.54 -3.392200e+02 1.285000e+02
## D_LiabFundBalRatio              0.14       0.52 -1.409300e+02 1.197100e+02
## D_DaysSalesOutstanding         -0.04       0.21 -2.506000e+01 5.150000e+01
## D_LaborCompRatio                0.02       0.08 -5.670000e+00 5.100000e+00
## D_OpProfitMargin                0.16       0.94 -1.010000e+02 7.800000e+01
## D_DaysCashOnHand               -0.27       0.76 -6.450000e+02 1.694500e+04
## D_BedUtil                      -0.03       0.10 -5.700000e-01 3.860000e+00
## D_AdjPxDays                    -0.01       0.07 -8.100000e-01 5.420000e+01
## D_Alt1Ohls3                    -0.22       0.78 -8.997879e+10 3.052270e+09
## D_AltmanX2                      0.03       1.89 -1.708382e+08 7.506213e+10
## D_AltmanX3                     -1.80       1.13 -1.539000e+03 3.406117e+10
## D_AltmanX4                     -0.37       1.73 -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.50 -3.152000e+01 1.050000e+02
## D_OhlsonX6                      0.26       1.48 -8.772930e+03 5.543998e+10
## D_OhlsonX7                     -2.07       1.23 -5.342444e+10 4.296701e+10
## D_OhlsonX9                     -0.25       1.86 -2.101581e+04 2.107294e+09
## NegLiab.y.1.                    0.00       0.00  0.000000e+00 1.000000e+00
## NegLiab.y.2.                    0.00       0.00  0.000000e+00 1.000000e+00
##                                  range   skew kurtosis           se         IQR
## Bankrupt                  1.000000e+00   0.00    -2.00         0.01        1.00
## Year                      1.300000e+01   0.10    -1.06         0.07        6.00
## AR_by_OpIncome            8.590000e+00   0.82    -0.47         0.04        3.85
## FB_Plus_OpInc_ByFB        2.199500e+02  31.29  1321.35         0.08        0.88
## PercentMedicaidDays       8.300000e-01   2.71    13.57         0.00        0.08
## PercentMedicareDays       8.300000e-01   0.18     0.42         0.00        0.14
## CurrentRatio              7.168160e+03  54.81  3007.96         2.35        1.60
## Debt2Equity               6.967300e+02   5.84   370.52         0.26        1.67
## DaysSalesOutstanding      5.973620e+03  22.87   940.04         1.91       18.52
## LaborCompRatio            6.290000e+00   7.98    70.95         0.01        0.18
## OpProfitMargin            1.126000e+01  -8.40    76.15         0.02        0.20
## DaysCashOnHand            2.377350e+03   8.31   113.64         1.60       31.54
## BedUtil                   9.900000e-01   0.44    -0.44         0.00        0.28
## AdjPxDays                 1.257900e+02   4.62    36.14         0.14        3.90
## Alt1Ohls3                 3.786155e+10 -12.35   743.89  11274787.81        0.32
## AltmanX2                  2.602344e+10 -39.00  1577.65   9936538.69        0.20
## AltmanX3                  7.463346e+09 -33.70  1325.01   2550332.01        0.25
## AltmanX4                  1.760199e+11  35.97  1652.66  58475810.68        0.31
## OhlsonX1                  2.839000e+01  -6.00    74.66         0.03        1.47
## OhlsonX2                  3.828390e+10 -43.49  1999.79  13470518.56        0.58
## OhlsonX4                  1.589500e+02   5.96   339.96         0.06        1.28
## OhlsonX6                  1.388120e+10 -49.00  2586.86   4081397.86        0.19
## OhlsonX7                  3.713163e+10  11.09   158.71  25084315.74        0.39
## OhlsonX9                  4.164433e+09  13.72   435.12   1672016.86 11233726.81
## OhlsonX5                  1.000000e+00   1.16    -0.67         0.01        0.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.71    11.77         0.00        0.00
## ForProfit                 1.000000e+00   1.02    -0.96         0.01        1.00
## HC1                       1.000000e+00   4.35    16.96         0.00        0.00
## HC2                       1.000000e+00   1.75     1.07         0.01        0.00
## HC4                       1.000000e+00   2.21     2.90         0.01        0.00
## HC5                       1.000000e+00   3.67    11.50         0.00        0.00
## AR_by_OpIncome.y.1.       8.600000e+00   0.62    -0.63         0.04        4.00
## FB_Plus_OpInc_ByFB.y.1.   1.608440e+03  41.45  1932.19         0.51        0.43
## PercentMedicaidDays.y.1.  8.300000e-01   2.71    13.57         0.00        0.08
## PercentMedicareDays.y.1.  8.300000e-01   0.18     0.42         0.00        0.14
## CurrentRatio.y.1.         2.269560e+03  29.98  1801.08         0.57        1.47
## Debt2Equity.y.1.          5.095490e+03  42.58  1967.29         1.67        1.14
## DaysSalesOutstanding.y.1. 5.464590e+03  22.74   949.83         1.70       21.21
## LaborCompRatio.y.1.       2.230000e+00   0.89     3.88         0.00        0.19
## OpProfitMargin.y.1.       5.930000e+00  -0.74    45.62         0.00        0.16
## DaysCashOnHand.y.1.       2.695470e+03   8.56   128.31         1.64       36.03
## BedUtil.y.1.              9.800000e-01   0.28    -0.57         0.00        0.27
## AdjPxDays.y.1.            1.415500e+02   5.15    50.22         0.14        3.95
## Alt1Ohls3.y.1.            1.424011e+10 -40.43  1713.76   5506072.67        0.24
## 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.49  21469104.86        0.21
## OhlsonX1.y.1.             2.827000e+01  -5.21    73.51         0.03        1.27
## OhlsonX2.y.1.             3.917888e+09  46.37  2318.26   1386212.29        0.48
## OhlsonX4.y.1.             2.548600e+02 -25.60  1089.35         0.08        0.71
## OhlsonX6.y.1.             1.999279e+09 -37.67  1571.32    713589.43        0.14
## OhlsonX7.y.1.             3.274721e+10  10.91   152.72  23516218.49        0.34
## OhlsonX9.y.1.             6.536766e+09  29.40  1329.80   2128603.43  7297881.37
## OhlsonX5.y.1.             1.000000e+00   2.15     2.62         0.01        0.00
## OhlsonX8.y.1.             1.000000e+00   0.09    -1.99         0.01        1.00
## HC4_5.y.1.                1.000000e+00   1.57     0.48         0.01        0.00
## AR_by_OpIncome.y.2.       8.600000e+00   0.68    -0.47         0.04        3.33
## FB_Plus_OpInc_ByFB.y.2.   4.225600e+02 -34.57  1450.31         0.13        0.25
## PercentMedicaidDays.y.2.  8.300000e-01   2.71    13.57         0.00        0.08
## PercentMedicareDays.y.2.  8.300000e-01   0.18     0.42         0.00        0.14
## CurrentRatio.y.2.         4.464080e+03  54.27  2967.59         1.47        1.57
## Debt2Equity.y.2.          3.710630e+03 -37.66  1478.13         1.41        1.04
## DaysSalesOutstanding.y.2. 3.263970e+03   8.63   497.41         1.13       20.67
## LaborCompRatio.y.2.       6.570000e+00   5.41   182.12         0.00        0.16
## OpProfitMargin.y.2.       1.776000e+01  -4.87   579.69         0.01        0.11
## DaysCashOnHand.y.2.       2.357040e+03   7.96   121.07         1.50       36.85
## BedUtil.y.2.              9.900000e-01   0.36    -0.67         0.00        0.28
## AdjPxDays.y.2.            1.372400e+02   5.01    48.08         0.14        4.14
## Alt1Ohls3.y.2.            1.319598e+10 -32.61  1105.63   6434925.40        0.22
## 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.26
## OhlsonX1.y.2.             2.815000e+01  -5.66    83.17         0.03        1.25
## OhlsonX2.y.2.             3.252191e+09  38.98  1582.79   1310513.44        0.45
## OhlsonX4.y.2.             1.774580e+03  54.20  2964.79         0.56        0.63
## 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.58   2067215.57  8811311.27
## OhlsonX5.y.2.             1.000000e+00   2.23     2.96         0.01        0.00
## OhlsonX8.y.2.             1.000000e+00   1.55     0.39         0.01        0.00
## D_AR_by_OpIncome          1.246000e+03  46.10  2363.61         0.44        2.98
## D_FB_Plus_OpInc_ByFB      5.910000e+02  30.55  1298.83         0.18        1.60
## D_CurrentRatio            1.398800e+02 -33.05  1439.72         0.05        0.45
## D_Debt2Equity             4.677200e+02  -1.67   166.18         0.25        0.96
## D_LiabFundBalRatio        2.606400e+02  -6.21   918.41         0.07        0.71
## D_DaysSalesOutstanding    7.656000e+01   7.58   110.52         0.04        0.28
## D_LaborCompRatio          1.076000e+01   6.38    65.30         0.01        0.10
## D_OpProfitMargin          1.790000e+02  -6.13   348.33         0.06        1.33
## D_DaysCashOnHand          1.759000e+04  47.56  2421.49         5.92        1.01
## D_BedUtil                 4.430000e+00   5.92    40.17         0.01        0.14
## D_AdjPxDays               5.501000e+01  52.69  2853.43         0.02        0.10
## D_Alt1Ohls3               9.303106e+10 -53.86  2934.59  29946667.80        1.07
## 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.52
## D_AltmanX4                5.960000e+11  43.04  2305.70 159542032.39        2.36
## D_OhlsonX1                3.620000e+00 -15.30   295.72         0.00        0.02
## D_OhlsonX2                7.713030e+10 -28.62  1741.39  19704719.34        0.23
## D_OhlsonX4                1.365200e+02  25.89  1179.56         0.04        0.75
## D_OhlsonX6                5.543999e+10  52.98  2863.21  18565855.67        2.08
## D_OhlsonX7                9.639146e+10  -4.18   905.40  26457235.06        3.99
## D_OhlsonX9                2.107315e+09  54.95  3019.00    696395.94        2.54
## NegLiab.y.1.              1.000000e+00   4.74    20.45         0.00        0.00
## NegLiab.y.2.              1.000000e+00   4.67    19.83         0.00        0.00
##                                 Q0.25      Q0.75
## Bankrupt                         0.00       1.00
## Year                          2011.00    2017.00
## AR_by_OpIncome                   0.61       4.47
## FB_Plus_OpInc_ByFB               0.24       1.12
## PercentMedicaidDays              0.03       0.11
## PercentMedicareDays              0.26       0.40
## CurrentRatio                     0.56       2.16
## Debt2Equity                      0.02       1.69
## DaysSalesOutstanding            37.35      55.87
## LaborCompRatio                   0.39       0.57
## OpProfitMargin                  -0.20       0.00
## DaysCashOnHand                   0.01      31.55
## BedUtil                          0.27       0.55
## AdjPxDays                        2.72       6.62
## Alt1Ohls3                       -0.13       0.19
## AltmanX2                        -0.15       0.05
## AltmanX3                        -0.19       0.06
## AltmanX4                        -0.17       0.14
## OhlsonX1                        10.72      12.19
## OhlsonX2                         0.37       0.95
## OhlsonX4                         0.43       1.71
## OhlsonX6                        -0.14       0.05
## OhlsonX7                        -0.22       0.17
## OhlsonX9                  -6350365.52 4883361.28
## OhlsonX5                         0.00       0.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.              0.49       4.49
## 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.87       2.34
## Debt2Equity.y.1.                 0.06       1.20
## DaysSalesOutstanding.y.1.       41.90      63.11
## LaborCompRatio.y.1.              0.38       0.57
## OpProfitMargin.y.1.             -0.16       0.00
## DaysCashOnHand.y.1.              3.98      40.01
## BedUtil.y.1.                     0.30       0.57
## AdjPxDays.y.1.                   2.90       6.84
## Alt1Ohls3.y.1.                  -0.04       0.20
## AltmanX2.y.1.                   -0.09       0.05
## AltmanX3.y.1.                   -0.14       0.06
## AltmanX4.y.1.                   -0.12       0.09
## OhlsonX1.y.1.                   10.89      12.16
## OhlsonX2.y.1.                    0.37       0.85
## OhlsonX4.y.1.                    0.39       1.10
## OhlsonX6.y.1.                   -0.10       0.04
## OhlsonX7.y.1.                   -0.21       0.13
## OhlsonX9.y.1.             -3184698.37 4113183.00
## 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.              1.15       4.48
## FB_Plus_OpInc_ByFB.y.2.          0.84       1.09
## 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.10       1.14
## DaysSalesOutstanding.y.2.       44.51      65.18
## LaborCompRatio.y.2.              0.37       0.53
## OpProfitMargin.y.2.             -0.10       0.01
## DaysCashOnHand.y.2.              2.58      39.42
## BedUtil.y.2.                     0.29       0.58
## AdjPxDays.y.2.                   2.91       7.05
## Alt1Ohls3.y.2.                  -0.01       0.21
## AltmanX2.y.2.                   -0.03       0.08
## AltmanX3.y.2.                   -0.06       0.07
## AltmanX4.y.2.                   -0.04       0.22
## OhlsonX1.y.2.                   10.89      12.14
## OhlsonX2.y.2.                    0.36       0.81
## OhlsonX4.y.2.                    0.38       1.01
## OhlsonX6.y.2.                   -0.04       0.06
## OhlsonX7.y.2.                   -0.09       0.15
## OhlsonX9.y.2.             -2440221.53 6371089.74
## OhlsonX5.y.2.                    0.00       0.00
## OhlsonX8.y.2.                    0.00       0.00
## D_AR_by_OpIncome                -0.33       2.66
## D_FB_Plus_OpInc_ByFB            -1.59       0.01
## D_CurrentRatio                  -0.39       0.06
## D_Debt2Equity                   -0.15       0.81
## D_LiabFundBalRatio              -0.21       0.51
## D_DaysSalesOutstanding          -0.17       0.10
## D_LaborCompRatio                -0.04       0.06
## D_OpProfitMargin                -0.47       0.86
## D_DaysCashOnHand                -0.84       0.17
## D_BedUtil                       -0.10       0.04
## D_AdjPxDays                     -0.06       0.04
## D_Alt1Ohls3                     -0.80       0.27
## D_AltmanX2                      -1.25       1.50
## D_AltmanX3                      -3.35       0.16
## D_AltmanX4                      -1.48       0.88
## D_OhlsonX1                      -0.01       0.01
## D_OhlsonX2                      -0.05       0.18
## D_OhlsonX4                      -0.06       0.69
## D_OhlsonX6                      -0.75       1.33
## D_OhlsonX7                      -3.84       0.16
## D_OhlsonX9                      -1.49       1.05
## NegLiab.y.1.                     0.00       0.00
## NegLiab.y.2.                     0.00       0.00
describe(train2, IQR = TRUE, quant = c(.25, .75))
##                           vars    n          mean           sd      median
## Bankrupt                     1 3630          0.50 5.000000e-01        0.50
## Year                         2 3630       2014.67 3.460000e+00     2015.00
## AR_by_OpIncome               3 3630          2.82 2.350000e+00        2.29
## FB_Plus_OpInc_ByFB           4 3630          6.99 5.368000e+01        1.02
## PercentMedicaidDays          5 3630          0.09 9.000000e-02        0.06
## PercentMedicareDays          6 3630          0.33 1.100000e-01        0.32
## CurrentRatio                 7 3630          1.89 8.380000e+00        1.21
## Debt2Equity                  8 3630        -16.32 1.481600e+02        0.25
## DaysSalesOutstanding         9 3630         53.83 6.958000e+01       48.57
## LaborCompRatio              10 3630          0.53 4.600000e-01        0.49
## OpProfitMargin              11 3630         -0.18 8.000000e-01       -0.09
## DaysCashOnHand              12 3630         32.67 1.088800e+02        9.25
## BedUtil                     13 3630          0.42 1.900000e-01        0.38
## AdjPxDays                   14 3630          6.18 8.070000e+00        3.71
## Alt1Ohls3                   15 3630  -14012054.32 5.576719e+08        0.07
## AltmanX2                    16 3630  -13296547.32 5.001788e+08       -0.04
## AltmanX3                    17 3630   -4052151.17 1.299567e+08       -0.03
## AltmanX4                    18 3630  168290131.27 1.834122e+09       -0.03
## OhlsonX1                    19 3630         11.36 1.840000e+00       11.16
## OhlsonX2                    20 3630  -10816746.82 6.820421e+08        0.69
## OhlsonX4                    21 3630          1.09 2.590000e+00        0.77
## OhlsonX6                    22 3630   -4968132.37 2.078432e+08       -0.01
## OhlsonX7                    23 3630  199766372.68 1.394732e+09       -0.02
## OhlsonX9                    24 3630    3784258.29 9.428476e+07 -1615907.70
## OhlsonX5                    25 3630          0.25 4.300000e-01        0.00
## OhlsonX8                    26 3630          0.47 5.000000e-01        0.00
## Govt                        27 3630          0.09 2.900000e-01        0.00
## Urban                       28 3630          0.07 2.500000e-01        0.00
## ForProfit                   29 3630          0.24 4.300000e-01        0.00
## HC1                         30 3630          0.04 1.900000e-01        0.00
## HC2                         31 3630          0.19 3.900000e-01        0.00
## HC4                         32 3630          0.13 3.400000e-01        0.00
## HC5                         33 3630          0.07 2.500000e-01        0.00
## AR_by_OpIncome.y.1.         34 3630          2.88 2.290000e+00        2.45
## FB_Plus_OpInc_ByFB.y.1.     35 3630          1.28 2.510000e+01        0.94
## PercentMedicaidDays.y.1.    36 3630          0.09 9.000000e-02        0.06
## PercentMedicareDays.y.1.    37 3630          0.33 1.100000e-01        0.32
## CurrentRatio.y.1.           38 3630          1.05 1.956000e+01        1.31
## Debt2Equity.y.1.            39 3630          3.31 9.316000e+01        0.45
## DaysSalesOutstanding.y.1.   40 3630         53.86 6.705000e+01       49.16
## LaborCompRatio.y.1.         41 3630          0.48 1.300000e-01        0.48
## OpProfitMargin.y.1.         42 3630         -0.08 1.900000e-01       -0.06
## DaysCashOnHand.y.1.         43 3630         32.81 9.484000e+01       11.98
## BedUtil.y.1.                44 3630          0.43 1.900000e-01        0.41
## AdjPxDays.y.1.              45 3630          6.25 7.910000e+00        3.90
## Alt1Ohls3.y.1.              46 3630   -7329520.87 2.789119e+08        0.07
## AltmanX2.y.1.               47 3630   -1146613.81 4.208978e+07       -0.02
## AltmanX3.y.1.               48 3630    -806421.15 2.822171e+07        0.01
## AltmanX4.y.1.               49 3630  158935135.45 1.270329e+09       -0.02
## OhlsonX1.y.1.               50 3630         11.38 1.600000e+00       11.23
## OhlsonX2.y.1.               51 3630    2472331.79 8.658014e+07        0.63
## OhlsonX4.y.1.               52 3630          0.90 2.530000e+00        0.73
## OhlsonX6.y.1.               53 3630    -967555.75 3.590343e+07        0.00
## OhlsonX7.y.1.               54 3630  155158602.17 1.302636e+09        0.02
## OhlsonX9.y.1.               55 3630    4027409.16 6.363278e+07  -959171.50
## OhlsonX5.y.1.               56 3630          0.22 4.100000e-01        0.00
## OhlsonX8.y.1.               57 3630          0.34 4.700000e-01        0.00
## HC4_5.y.1.                  58 3630          0.21 4.100000e-01        0.00
## AR_by_OpIncome.y.2.         59 3630          2.80 2.380000e+00        2.19
## FB_Plus_OpInc_ByFB.y.2.     60 3630          0.86 9.990000e+00        0.94
## PercentMedicaidDays.y.2.    61 3630          0.09 9.000000e-02        0.06
## PercentMedicareDays.y.2.    62 3630          0.33 1.100000e-01        0.32
## CurrentRatio.y.2.           63 3630          3.47 7.364000e+01        1.44
## Debt2Equity.y.2.            64 3630         -0.74 7.075000e+01        0.50
## DaysSalesOutstanding.y.2.   65 3630         55.07 5.632000e+01       50.17
## LaborCompRatio.y.2.         66 3630          0.48 1.700000e-01        0.45
## OpProfitMargin.y.2.         67 3630         -0.09 3.100000e-01       -0.05
## DaysCashOnHand.y.2.         68 3630         29.95 8.859000e+01        9.10
## BedUtil.y.2.                69 3630          0.43 1.900000e-01        0.40
## AdjPxDays.y.2.              70 3630          6.32 7.800000e+00        4.00
## Alt1Ohls3.y.2.              71 3630  -67136878.45 5.786995e+08        0.08
## AltmanX2.y.2.               72 3630  -47781751.37 1.279615e+09        0.00
## AltmanX3.y.2.               73 3630  -28714848.43 2.783675e+08        0.01
## AltmanX4.y.2.               74 3630   13201249.71 2.590619e+09        0.01
## OhlsonX1.y.2.               75 3630         11.18 2.420000e+00       11.27
## OhlsonX2.y.2.               76 3630   60990225.20 5.234380e+08        0.61
## OhlsonX4.y.2.               77 3630         11.57 1.112200e+02        0.67
## OhlsonX6.y.2.               78 3630  -18463083.55 3.944808e+08        0.01
## OhlsonX7.y.2.               79 3630  176129290.07 1.291247e+09        0.02
## OhlsonX9.y.2.               80 3630    6528350.77 1.197840e+08   169182.95
## OhlsonX5.y.2.               81 3630          0.21 4.100000e-01        0.00
## OhlsonX8.y.2.               82 3630          0.26 4.400000e-01        0.00
## D_AR_by_OpIncome            83 3630          2.54 2.178000e+01        0.00
## D_FB_Plus_OpInc_ByFB        84 3630          3.64 5.131000e+01       -0.10
## D_CurrentRatio              85 3630         -0.11 3.410000e+00       -0.10
## D_Debt2Equity               86 3630         -5.56 5.850000e+01        0.00
## D_LiabFundBalRatio          87 3630         -6.55 5.947000e+01       -0.05
## D_DaysSalesOutstanding      88 3630         -0.76 7.624000e+01       -0.01
## D_LaborCompRatio            89 3630          0.07 5.000000e-01        0.00
## D_OpProfitMargin            90 3630          0.11 3.250000e+00        0.03
## D_DaysCashOnHand            91 3630          5.88 2.666100e+02       -0.09
## D_BedUtil                   92 3630          0.03 4.000000e-01       -0.01
## D_AdjPxDays                 93 3630          0.01 9.200000e-01       -0.01
## D_Alt1Ohls3                 94 3630  -27138183.69 1.503978e+09        0.01
## D_AltmanX2                  95 3630   25893838.05 1.263829e+09       -0.20
## D_AltmanX3                  96 3630   18786769.56 7.571639e+08       -0.20
## D_AltmanX4                  97 3630 -850379747.79 4.593738e+10       -0.33
## D_OhlsonX1                  98 3630          0.00 1.000000e-01        0.00
## D_OhlsonX2                  99 3630   -1256300.12 9.891207e+08        0.06
## D_OhlsonX4                 100 3630          0.40 4.070000e+00        0.09
## D_OhlsonX6                 101 3630   19945794.66 9.334956e+08       -0.13
## D_OhlsonX7                 102 3630   92908608.53 3.131947e+09       -0.22
## D_OhlsonX9                 103 3630     747391.35 3.861053e+07       -0.27
## NegLiab.y.1.               104 3630          0.04 1.900000e-01        0.00
## NegLiab.y.2.               105 3630          0.04 1.900000e-01        0.00
##                              trimmed        mad           min          max
## Bankrupt                        0.50       0.74  0.000000e+00 1.000000e+00
## Year                         2014.67       4.45  2.008000e+03 2.021000e+03
## AR_by_OpIncome                  2.57       2.64  0.000000e+00 8.560000e+00
## FB_Plus_OpInc_ByFB              1.08       0.52 -1.328000e+01 6.986900e+02
## PercentMedicaidDays             0.07       0.04  0.000000e+00 8.100000e-01
## PercentMedicareDays             0.33       0.10  0.000000e+00 8.700000e-01
## CurrentRatio                    1.40       1.08 -7.403000e+01 3.621200e+02
## Debt2Equity                     0.01       1.16 -1.922500e+03 4.077900e+02
## DaysSalesOutstanding           49.94      13.09 -7.416800e+02 2.772490e+03
## LaborCompRatio                  0.48       0.13  1.000000e-02 6.340000e+00
## OpProfitMargin                 -0.08       0.14 -1.046000e+01 6.500000e-01
## DaysCashOnHand                 15.84      13.70 -7.541700e+02 3.060150e+03
## BedUtil                         0.41       0.19  0.000000e+00 1.000000e+00
## AdjPxDays                       4.51       2.85  0.000000e+00 1.258200e+02
## Alt1Ohls3                       0.05       0.27 -2.069512e+10 1.716643e+10
## AltmanX2                       -0.05       0.15 -2.401988e+10 2.003558e+09
## AltmanX3                       -0.04       0.16 -6.057755e+09 1.405591e+09
## AltmanX4                    96265.80       0.25 -4.207450e+10 4.085753e+10
## OhlsonX1                       11.34       1.26 -1.115000e+01 1.721000e+01
## OhlsonX2                        0.68       0.49 -3.619138e+10 4.035141e+09
## OhlsonX4                        0.93       0.70 -2.373000e+01 8.697000e+01
## OhlsonX6                       -0.02       0.14 -1.187764e+10 2.003558e+09
## OhlsonX7                   329606.69       0.25 -2.382459e+10 2.906021e+10
## OhlsonX9                   255174.12 7285641.33 -1.778187e+09 2.986955e+09
## OhlsonX5                        0.19       0.00  0.000000e+00 1.000000e+00
## OhlsonX8                        0.47       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.18       0.00  0.000000e+00 1.000000e+00
## HC1                             0.00       0.00  0.000000e+00 1.000000e+00
## HC2                             0.11       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.             2.66       2.69  0.000000e+00 8.600000e+00
## FB_Plus_OpInc_ByFB.y.1.         0.84       0.35 -2.297900e+02 1.378650e+03
## PercentMedicaidDays.y.1.        0.07       0.04  0.000000e+00 8.100000e-01
## PercentMedicareDays.y.1.        0.33       0.10  0.000000e+00 8.700000e-01
## CurrentRatio.y.1.               1.52       1.08 -7.873100e+02 4.025400e+02
## Debt2Equity.y.1.                0.80       0.77 -6.275700e+02 4.467920e+03
## DaysSalesOutstanding.y.1.      50.68      13.31 -6.274600e+02 2.681920e+03
## LaborCompRatio.y.1.             0.48       0.12 -6.000000e-02 1.970000e+00
## OpProfitMargin.y.1.            -0.07       0.12 -2.650000e+00 1.220000e+00
## DaysCashOnHand.y.1.            17.94      17.32 -9.288000e+02 2.814090e+03
## BedUtil.y.1.                    0.42       0.21  0.000000e+00 1.000000e+00
## AdjPxDays.y.1.                  4.67       3.00  0.000000e+00 1.415600e+02
## Alt1Ohls3.y.1.                  0.04       0.23 -1.393858e+10 1.244798e+08
## AltmanX2.y.1.                  -0.02       0.12 -1.789527e+09 2.097515e+08
## AltmanX3.y.1.                   0.00       0.13 -1.542306e+09 4.040000e+00
## AltmanX4.y.1.                   0.05       0.20 -2.914540e+10 2.285539e+10
## OhlsonX1.y.1.                  11.34       1.28 -1.115000e+01 1.712000e+01
## OhlsonX2.y.1.                   0.63       0.39 -9.890000e+00 3.917888e+09
## OhlsonX4.y.1.                   0.85       0.63 -7.909000e+01 7.136000e+01
## OhlsonX6.y.1.                  -0.01       0.10 -1.789527e+09 2.097517e+08
## OhlsonX7.y.1.                   0.09       0.25 -2.396372e+10 2.558153e+10
## OhlsonX9.y.1.             1339020.35 5597961.05 -1.308272e+09 1.455687e+09
## OhlsonX5.y.1.                   0.15       0.00  0.000000e+00 1.000000e+00
## OhlsonX8.y.1.                   0.30       0.00  0.000000e+00 1.000000e+00
## HC4_5.y.1.                      0.13       0.00  0.000000e+00 1.000000e+00
## AR_by_OpIncome.y.2.             2.55       2.60  1.000000e-02 8.600000e+00
## FB_Plus_OpInc_ByFB.y.2.         0.90       0.27 -3.264500e+02 4.451800e+02
## PercentMedicaidDays.y.2.        0.07       0.04  0.000000e+00 8.100000e-01
## PercentMedicareDays.y.2.        0.33       0.10  0.000000e+00 8.700000e-01
## CurrentRatio.y.2.               1.63       1.10 -4.556000e+01 4.418520e+03
## Debt2Equity.y.2.                0.68       0.70 -3.255210e+03 4.554200e+02
## DaysSalesOutstanding.y.2.      51.33      12.89 -1.956300e+02 2.455250e+03
## LaborCompRatio.y.2.             0.46       0.14 -1.990000e+00 4.580000e+00
## OpProfitMargin.y.2.            -0.06       0.10 -9.570000e+00 8.190000e+00
## DaysCashOnHand.y.2.            15.70      13.53 -6.907700e+02 2.385800e+03
## BedUtil.y.2.                    0.42       0.20  1.000000e-02 1.000000e+00
## AdjPxDays.y.2.                  4.79       2.96  0.000000e+00 1.372600e+02
## Alt1Ohls3.y.2.                  0.06       0.21 -1.200268e+10 1.643000e+01
## AltmanX2.y.2.                  -0.01       0.09 -5.695970e+10 1.100960e+09
## AltmanX3.y.2.                  -0.01       0.12 -3.464660e+09 4.765823e+09
## AltmanX4.y.2.                   0.08       0.18 -6.756429e+10 1.140000e+11
## OhlsonX1.y.2.                  11.33       1.26 -1.115000e+01 1.700000e+01
## OhlsonX2.y.2.                   0.61       0.37 -6.485320e+07 6.737484e+09
## OhlsonX4.y.2.                   0.79       0.54 -5.975000e+01 1.675990e+03
## OhlsonX6.y.2.                   0.00       0.10 -2.700965e+09 1.998557e+10
## OhlsonX7.y.2.                   0.04       0.22 -2.319753e+10 2.424540e+10
## OhlsonX9.y.2.             1557435.78 5648635.54 -6.756429e+08 5.228494e+09
## OhlsonX5.y.2.                   0.14       0.00  0.000000e+00 1.000000e+00
## OhlsonX8.y.2.                   0.19       0.00  0.000000e+00 1.000000e+00
## D_AR_by_OpIncome                0.77       0.82 -1.000000e+00 1.245000e+03
## D_FB_Plus_OpInc_ByFB           -0.46       0.41 -9.690000e+02 6.228300e+02
## D_CurrentRatio                 -0.07       0.30 -1.260800e+02 1.788000e+01
## D_Debt2Equity                   0.03       0.64 -7.519800e+02 3.553800e+02
## D_LiabFundBalRatio             -0.15       0.58 -7.742200e+02 5.721000e+01
## D_DaysSalesOutstanding          0.00       0.19 -4.557000e+03 5.583800e+02
## D_LaborCompRatio                0.01       0.07 -5.670000e+00 1.500000e+01
## D_OpProfitMargin                0.14       0.84 -1.010000e+02 7.800000e+01
## D_DaysCashOnHand                0.01       0.79 -1.522800e+04 2.324000e+03
## D_BedUtil                      -0.02       0.10 -1.000000e+00 3.860000e+00
## D_AdjPxDays                    -0.02       0.10 -9.500000e-01 5.420000e+01
## D_Alt1Ohls3                    -0.02       0.67 -8.997879e+10 2.915314e+09
## D_AltmanX2                     -0.30       1.34 -1.708382e+08 7.506213e+10
## D_AltmanX3                     -0.50       0.89 -1.539000e+03 3.406117e+10
## D_AltmanX4                     -0.54       1.32 -2.750000e+12 5.337752e+10
## D_OhlsonX1                      0.00       0.01 -2.310000e+00 9.600000e-01
## D_OhlsonX2                      0.07       0.19 -5.097377e+10 2.615652e+10
## D_OhlsonX4                      0.11       0.36 -1.045000e+02 6.600000e+01
## D_OhlsonX6                     -0.17       1.14 -6.500000e+01 5.543998e+10
## D_OhlsonX7                     -0.38       0.99 -5.342444e+10 1.700000e+11
## D_OhlsonX9                     -0.45       1.38 -3.247753e+08 2.107294e+09
## NegLiab.y.1.                    0.00       0.00  0.000000e+00 1.000000e+00
## NegLiab.y.2.                    0.00       0.00  0.000000e+00 1.000000e+00
##                                  range   skew kurtosis           se         IQR
## Bankrupt                  1.000000e+00   0.00    -2.00         0.01        1.00
## Year                      1.300000e+01  -0.05    -0.87         0.06        5.00
## AR_by_OpIncome            8.560000e+00   0.70    -0.54         0.04        3.65
## FB_Plus_OpInc_ByFB        7.119700e+02  10.28   110.47         0.89        0.70
## PercentMedicaidDays       8.100000e-01   2.20     6.29         0.00        0.08
## PercentMedicareDays       8.700000e-01   0.24     0.21         0.00        0.14
## CurrentRatio              4.361500e+02  27.75  1063.09         0.14        1.64
## Debt2Equity               2.330290e+03 -10.22   109.92         2.46        1.61
## DaysSalesOutstanding      3.514170e+03  20.14   720.42         1.15       18.06
## LaborCompRatio            6.330000e+00   8.81    87.56         0.01        0.17
## OpProfitMargin            1.111000e+01  -9.10    91.48         0.01        0.18
## DaysCashOnHand            3.814320e+03  12.59   251.80         1.81       29.86
## BedUtil                   1.000000e+00   0.45    -0.58         0.00        0.29
## AdjPxDays                 1.258200e+02   4.49    34.33         0.13        4.61
## Alt1Ohls3                 3.786155e+10 -13.00   922.01   9256044.68        0.36
## AltmanX2                  2.602344e+10 -42.46  1876.82   8301794.75        0.21
## AltmanX3                  7.463346e+09 -35.71  1504.61   2156976.87        0.22
## AltmanX4                  8.293204e+10   2.62   247.73  30442128.38        0.36
## OhlsonX1                  2.836000e+01  -5.23    65.38         0.03        1.79
## OhlsonX2                  4.022652e+10 -46.42  2324.91  11320298.31        0.66
## OhlsonX4                  1.107000e+02  14.02   460.42         0.04        1.07
## OhlsonX6                  1.388120e+10 -51.75  2938.90   3449709.05        0.18
## OhlsonX7                  5.288480e+10   7.96   152.10  23149277.33        0.42
## OhlsonX9                  4.765142e+09   4.71   369.03   1564905.78 11349981.33
## OhlsonX5                  1.000000e+00   1.14    -0.70         0.01        1.00
## OhlsonX8                  1.000000e+00   0.11    -1.99         0.01        1.00
## Govt                      1.000000e+00   2.83     6.03         0.00        0.00
## Urban                     1.000000e+00   3.42     9.70         0.00        0.00
## ForProfit                 1.000000e+00   1.21    -0.54         0.01        0.00
## HC1                       1.000000e+00   4.93    22.32         0.00        0.00
## HC2                       1.000000e+00   1.59     0.53         0.01        0.00
## HC4                       1.000000e+00   2.18     2.76         0.01        0.00
## HC5                       1.000000e+00   3.42     9.70         0.00        0.00
## AR_by_OpIncome.y.1.       8.600000e+00   0.63    -0.57         0.04        3.58
## FB_Plus_OpInc_ByFB.y.1.   1.608440e+03  46.88  2525.76         0.42        0.54
## PercentMedicaidDays.y.1.  8.100000e-01   2.20     6.29         0.00        0.08
## PercentMedicareDays.y.1.  8.700000e-01   0.24     0.21         0.00        0.14
## CurrentRatio.y.1.         1.189850e+03 -14.51   820.59         0.32        1.68
## Debt2Equity.y.1.          5.095490e+03  38.42  1656.51         1.55        1.45
## DaysSalesOutstanding.y.1. 3.309380e+03  20.76   731.12         1.11       18.51
## LaborCompRatio.y.1.       2.030000e+00   1.12     6.52         0.00        0.17
## OpProfitMargin.y.1.       3.870000e+00  -3.04    26.95         0.00        0.16
## DaysCashOnHand.y.1.       3.742890e+03  11.62   255.31         1.57       32.19
## BedUtil.y.1.              1.000000e+00   0.32    -0.67         0.00        0.30
## AdjPxDays.y.1.            1.415600e+02   4.89    44.69         0.13        4.82
## Alt1Ohls3.y.1.            1.406306e+10 -43.41  1991.04   4629282.57        0.31
## AltmanX2.y.1.             1.999279e+09 -38.75  1571.14    698591.50        0.16
## AltmanX3.y.1.             1.542306e+09 -47.31  2482.70    468414.20        0.18
## AltmanX4.y.1.             5.200080e+10   4.08   188.41  21084486.94        0.30
## OhlsonX1.y.1.             2.827000e+01  -3.51    52.50         0.03        1.75
## OhlsonX2.y.1.             3.917888e+09  39.97  1663.29   1437027.10        0.53
## OhlsonX4.y.1.             1.504500e+02  -4.13   454.23         0.04        0.91
## OhlsonX6.y.1.             1.999279e+09 -41.13  1874.48    595912.69        0.15
## OhlsonX7.y.1.             4.954525e+10   8.07   168.44  21620698.97        0.36
## OhlsonX9.y.1.             2.763959e+09   2.48   191.97   1056154.78 10043059.25
## OhlsonX5.y.1.             1.000000e+00   1.35    -0.18         0.01        0.00
## OhlsonX8.y.1.             1.000000e+00   0.68    -1.54         0.01        1.00
## HC4_5.y.1.                1.000000e+00   1.44     0.08         0.01        0.00
## AR_by_OpIncome.y.2.       8.600000e+00   0.72    -0.57         0.04        3.71
## FB_Plus_OpInc_ByFB.y.2.   7.716300e+02  12.57  1440.33         0.17        0.38
## PercentMedicaidDays.y.2.  8.100000e-01   2.20     6.29         0.00        0.08
## PercentMedicareDays.y.2.  8.700000e-01   0.24     0.21         0.00        0.14
## CurrentRatio.y.2.         4.464080e+03  59.40  3557.02         1.22        1.68
## Debt2Equity.y.2.          3.710630e+03 -41.73  1798.68         1.17        1.02
## DaysSalesOutstanding.y.2. 2.650880e+03  26.75  1001.70         0.93       17.84
## LaborCompRatio.y.2.       6.570000e+00   3.82   106.77         0.00        0.19
## OpProfitMargin.y.2.       1.776000e+01  -3.69   384.47         0.01        0.14
## DaysCashOnHand.y.2.       3.076570e+03  10.69   199.29         1.47       30.40
## BedUtil.y.2.              9.900000e-01   0.37    -0.63         0.00        0.29
## AdjPxDays.y.2.            1.372500e+02   4.81    43.66         0.13        4.74
## Alt1Ohls3.y.2.            1.200268e+10 -10.32   123.91   9605053.45        0.27
## AltmanX2.y.2.             5.806066e+10 -39.90  1653.79  21238612.68        0.13
## AltmanX3.y.2.             8.230483e+09  -7.01   105.17   4620247.13        0.16
## AltmanX4.y.2.             1.815643e+11  19.15  1164.88  42998196.24        0.26
## OhlsonX1.y.2.             2.815000e+01  -5.10    39.78         0.04        1.71
## OhlsonX2.y.2.             6.802337e+09   9.50    94.21   8687842.34        0.49
## OhlsonX4.y.2.             1.735740e+03  11.27   133.74         1.85        0.82
## OhlsonX6.y.2.             2.268653e+10  34.42  1827.06   6547456.05        0.14
## OhlsonX7.y.2.             4.744292e+10   7.39   154.42  21431664.02        0.30
## OhlsonX9.y.2.             5.904137e+09  29.15  1138.13   1988132.63  8275333.76
## OhlsonX5.y.2.             1.000000e+00   1.43     0.05         0.01        0.00
## OhlsonX8.y.2.             1.000000e+00   1.12    -0.74         0.01        1.00
## D_AR_by_OpIncome          1.246000e+03  51.51  2918.60         0.36        1.74
## D_FB_Plus_OpInc_ByFB      1.591830e+03   6.71   121.22         0.85        0.94
## D_CurrentRatio            1.439500e+02 -29.35  1015.12         0.06        0.40
## D_Debt2Equity             1.107350e+03  -9.89   106.42         0.97        0.85
## D_LiabFundBalRatio        8.314300e+02 -10.32   111.23         0.99        0.81
## D_DaysSalesOutstanding    5.115380e+03 -58.69  3511.77         1.27        0.26
## D_LaborCompRatio          2.067000e+01  11.82   265.98         0.01        0.09
## D_OpProfitMargin          1.790000e+02  -6.41   406.59         0.05        1.18
## D_DaysCashOnHand          1.755200e+04 -50.91  2936.94         4.43        1.06
## D_BedUtil                 4.860000e+00   5.82    42.92         0.01        0.13
## D_AdjPxDays               5.515000e+01  56.03  3290.10         0.02        0.14
## D_Alt1Ohls3               9.289410e+10 -59.01  3522.48  24962508.03        0.90
## D_AltmanX2                7.523297e+10  57.90  3422.46  20976591.80        1.72
## D_AltmanX3                3.406117e+10  42.64  1826.37  12567143.89        1.39
## D_AltmanX4                2.803378e+12 -59.11  3530.96 762452658.94        1.75
## D_OhlsonX1                3.270000e+00 -17.59   362.94         0.00        0.01
## D_OhlsonX2                7.713030e+10 -31.40  2094.33  16417082.94        0.25
## D_OhlsonX4                1.705000e+02  -0.21   197.95         0.07        0.48
## D_OhlsonX6                5.543998e+10  57.85  3420.96  15493836.43        1.52
## D_OhlsonX7                2.234244e+11  43.69  2419.05  51982967.84        1.35
## D_OhlsonX9                2.432069e+09  48.42  2531.95    640844.25        1.83
## NegLiab.y.1.              1.000000e+00   4.77    20.77         0.00        0.00
## NegLiab.y.2.              1.000000e+00   4.73    20.41         0.00        0.00
##                                 Q0.25      Q0.75
## Bankrupt                         0.00       1.00
## Year                          2012.00    2017.00
## AR_by_OpIncome                   0.83       4.49
## FB_Plus_OpInc_ByFB               0.67       1.37
## PercentMedicaidDays              0.03       0.11
## PercentMedicareDays              0.26       0.40
## CurrentRatio                     0.60       2.24
## Debt2Equity                     -0.67       0.94
## DaysSalesOutstanding            40.61      58.67
## LaborCompRatio                   0.40       0.57
## OpProfitMargin                  -0.17       0.01
## DaysCashOnHand                   0.77      30.63
## BedUtil                          0.27       0.56
## AdjPxDays                        2.12       6.73
## Alt1Ohls3                       -0.13       0.23
## AltmanX2                        -0.15       0.06
## AltmanX3                        -0.15       0.07
## AltmanX4                        -0.16       0.20
## OhlsonX1                        10.46      12.25
## OhlsonX2                         0.34       1.00
## OhlsonX4                         0.40       1.47
## OhlsonX6                        -0.12       0.06
## OhlsonX7                        -0.15       0.27
## OhlsonX9                  -5723673.58 5626307.75
## OhlsonX5                         0.00       1.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.              0.92       4.50
## FB_Plus_OpInc_ByFB.y.1.          0.57       1.11
## PercentMedicaidDays.y.1.         0.03       0.11
## PercentMedicareDays.y.1.         0.26       0.40
## CurrentRatio.y.1.                0.70       2.38
## Debt2Equity.y.1.                 0.07       1.52
## DaysSalesOutstanding.y.1.       41.61      60.11
## LaborCompRatio.y.1.              0.39       0.56
## OpProfitMargin.y.1.             -0.15       0.01
## DaysCashOnHand.y.1.              1.89      34.08
## BedUtil.y.1.                     0.28       0.58
## AdjPxDays.y.1.                   2.21       7.03
## Alt1Ohls3.y.1.                  -0.11       0.20
## AltmanX2.y.1.                   -0.10       0.06
## AltmanX3.y.1.                   -0.10       0.09
## AltmanX4.y.1.                   -0.13       0.17
## OhlsonX1.y.1.                   10.48      12.23
## OhlsonX2.y.1.                    0.36       0.89
## OhlsonX4.y.1.                    0.39       1.30
## OhlsonX6.y.1.                   -0.08       0.07
## OhlsonX7.y.1.                   -0.13       0.23
## OhlsonX9.y.1.             -4062555.75 5980503.50
## 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.              0.78       4.50
## FB_Plus_OpInc_ByFB.y.2.          0.71       1.09
## PercentMedicaidDays.y.2.         0.03       0.11
## PercentMedicareDays.y.2.         0.26       0.40
## CurrentRatio.y.2.                0.80       2.48
## Debt2Equity.y.2.                 0.13       1.15
## DaysSalesOutstanding.y.2.       42.30      60.13
## LaborCompRatio.y.2.              0.37       0.56
## OpProfitMargin.y.2.             -0.13       0.01
## DaysCashOnHand.y.2.              0.41      30.81
## BedUtil.y.2.                     0.28       0.57
## AdjPxDays.y.2.                   2.33       7.07
## Alt1Ohls3.y.2.                  -0.06       0.21
## AltmanX2.y.2.                   -0.07       0.06
## AltmanX3.y.2.                   -0.09       0.07
## AltmanX4.y.2.                   -0.09       0.17
## OhlsonX1.y.2.                   10.48      12.19
## OhlsonX2.y.2.                    0.35       0.84
## OhlsonX4.y.2.                    0.37       1.20
## OhlsonX6.y.2.                   -0.07       0.07
## OhlsonX7.y.2.                   -0.14       0.16
## OhlsonX9.y.2.             -3006020.55 5269313.20
## OhlsonX5.y.2.                    0.00       0.00
## OhlsonX8.y.2.                    0.00       1.00
## D_AR_by_OpIncome                -0.34       1.40
## D_FB_Plus_OpInc_ByFB            -0.92       0.02
## D_CurrentRatio                  -0.29       0.12
## D_Debt2Equity                   -0.39       0.46
## D_LiabFundBalRatio              -0.52       0.29
## D_DaysSalesOutstanding          -0.14       0.12
## D_LaborCompRatio                -0.04       0.05
## D_OpProfitMargin                -0.41       0.78
## D_DaysCashOnHand                -0.63       0.43
## D_BedUtil                       -0.09       0.05
## D_AdjPxDays                     -0.09       0.05
## D_Alt1Ohls3                     -0.46       0.44
## D_AltmanX2                      -1.22       0.50
## D_AltmanX3                      -1.15       0.25
## D_AltmanX4                      -1.41       0.34
## D_OhlsonX1                      -0.01       0.01
## D_OhlsonX2                      -0.06       0.20
## D_OhlsonX4                      -0.14       0.34
## D_OhlsonX6                      -0.95       0.57
## D_OhlsonX7                      -1.06       0.29
## D_OhlsonX9                      -1.38       0.45
## NegLiab.y.1.                     0.00       0.00
## NegLiab.y.2.                     0.00       0.00
describe(train3, IQR = TRUE, quant = c(.25, .75))
##                           vars    n          mean           sd      median
## Bankrupt                     1 4236          0.50 5.000000e-01        0.50
## Year                         2 4236       2014.79 3.470000e+00     2015.00
## AR_by_OpIncome               3 4236          2.94 2.340000e+00        2.50
## FB_Plus_OpInc_ByFB           4 4236          5.21 4.320000e+01        1.04
## PercentMedicaidDays          5 4236          0.10 1.000000e-01        0.06
## PercentMedicareDays          6 4236          0.32 1.200000e-01        0.30
## CurrentRatio                 7 4236          3.80 1.097900e+02        1.36
## Debt2Equity                  8 4236        -11.58 1.193200e+02        0.18
## DaysSalesOutstanding         9 4236         60.72 8.584000e+01       49.36
## LaborCompRatio              10 4236          0.53 4.000000e-01        0.49
## OpProfitMargin              11 4236         -0.16 6.900000e-01       -0.08
## DaysCashOnHand              12 4236         34.71 1.071800e+02       12.60
## BedUtil                     13 4236          0.44 1.800000e-01        0.42
## AdjPxDays                   14 4236          6.25 7.750000e+00        3.93
## Alt1Ohls3                   15 4236  -16118386.68 5.592347e+08        0.09
## AltmanX2                    16 4236   -6628295.65 3.727348e+08       -0.02
## AltmanX3                    17 4236   -1807068.11 7.409149e+07       -0.02
## AltmanX4                    18 4236  156694811.35 3.763240e+09       -0.01
## OhlsonX1                    19 4236         11.39 1.860000e+00       11.22
## OhlsonX2                    20 4236   -8952071.89 6.322274e+08        0.59
## OhlsonX4                    21 4236          0.89 2.010000e+00        0.68
## OhlsonX6                    22 4236   -1551737.40 6.351308e+07       -0.01
## OhlsonX7                    23 4236  164051668.27 1.945425e+09       -0.01
## OhlsonX9                    24 4236    4250023.64 9.400601e+07  -930725.15
## OhlsonX5                    25 4236          0.19 3.900000e-01        0.00
## OhlsonX8                    26 4236          0.43 4.900000e-01        0.00
## Govt                        27 4236          0.07 2.600000e-01        0.00
## Urban                       28 4236          0.07 2.500000e-01        0.00
## ForProfit                   29 4236          0.21 4.100000e-01        0.00
## HC1                         30 4236          0.06 2.300000e-01        0.00
## HC2                         31 4236          0.16 3.700000e-01        0.00
## HC4                         32 4236          0.12 3.300000e-01        0.00
## HC5                         33 4236          0.07 2.600000e-01        0.00
## AR_by_OpIncome.y.1.         34 4236          2.68 2.350000e+00        2.07
## FB_Plus_OpInc_ByFB.y.1.     35 4236          1.30 1.230000e+01        1.00
## PercentMedicaidDays.y.1.    36 4236          0.10 1.000000e-01        0.06
## PercentMedicareDays.y.1.    37 4236          0.32 1.200000e-01        0.30
## CurrentRatio.y.1.           38 4236          0.67 2.912000e+01        1.42
## Debt2Equity.y.1.            39 4236          1.39 5.243000e+01        0.32
## DaysSalesOutstanding.y.1.   40 4236         54.86 7.448000e+01       50.00
## LaborCompRatio.y.1.         41 4236          0.48 1.400000e-01        0.47
## OpProfitMargin.y.1.         42 4236         -0.08 2.100000e-01       -0.07
## DaysCashOnHand.y.1.         43 4236         33.79 9.321000e+01       13.07
## BedUtil.y.1.                44 4236          0.44 1.900000e-01        0.44
## AdjPxDays.y.1.              45 4236          6.22 7.600000e+00        4.04
## Alt1Ohls3.y.1.              46 4236  -12845940.33 3.689064e+08        0.10
## AltmanX2.y.1.               47 4236   -4526840.09 2.187265e+08       -0.03
## AltmanX3.y.1.               48 4236    -688017.94 3.102368e+07        0.00
## AltmanX4.y.1.               49 4236   22424917.38 1.498362e+09       -0.04
## OhlsonX1.y.1.               50 4236         11.39 1.690000e+00       11.27
## OhlsonX2.y.1.               51 4236    2777651.64 8.658722e+07        0.57
## OhlsonX4.y.1.               52 4236          0.92 2.360000e+00        0.65
## OhlsonX6.y.1.               53 4236    -932798.54 3.435014e+07       -0.01
## OhlsonX7.y.1.               54 4236  180353864.43 1.151255e+09        0.00
## OhlsonX9.y.1.               55 4236    1007658.36 7.195376e+07 -1080671.50
## OhlsonX5.y.1.               56 4236          0.15 3.600000e-01        0.00
## OhlsonX8.y.1.               57 4236          0.44 5.000000e-01        0.00
## HC4_5.y.1.                  58 4236          0.20 4.000000e-01        0.00
## AR_by_OpIncome.y.2.         59 4236          2.89 2.320000e+00        2.29
## FB_Plus_OpInc_ByFB.y.2.     60 4236         -0.08 7.730000e+00        0.95
## PercentMedicaidDays.y.2.    61 4236          0.10 1.000000e-01        0.06
## PercentMedicareDays.y.2.    62 4236          0.32 1.200000e-01        0.30
## CurrentRatio.y.2.           63 4236          2.34 7.070000e+00        1.61
## Debt2Equity.y.2.            64 4236          2.15 4.498000e+01        0.37
## DaysSalesOutstanding.y.2.   65 4236         56.09 7.008000e+01       50.35
## LaborCompRatio.y.2.         66 4236          0.48 1.600000e-01        0.45
## OpProfitMargin.y.2.         67 4236         -0.07 2.600000e-01       -0.04
## DaysCashOnHand.y.2.         68 4236         33.39 8.983000e+01       13.28
## BedUtil.y.2.                69 4236          0.45 1.800000e-01        0.44
## AdjPxDays.y.2.              70 4236          6.28 7.490000e+00        4.16
## Alt1Ohls3.y.2.              71 4236  -55187063.96 5.627398e+08        0.10
## AltmanX2.y.2.               72 4236  -39111712.95 1.183168e+09        0.02
## AltmanX3.y.2.               73 4236  -20908855.21 2.408788e+08        0.02
## AltmanX4.y.2.               74 4236   92402092.92 1.234176e+09        0.03
## OhlsonX1.y.2.               75 4236         11.26 2.310000e+00       11.34
## OhlsonX2.y.2.               76 4236   45886507.36 4.537165e+08        0.55
## OhlsonX4.y.2.               77 4236         11.07 1.091900e+02        0.60
## OhlsonX6.y.2.               78 4236  -13117125.40 3.569867e+08        0.02
## OhlsonX7.y.2.               79 4236  172488824.11 1.138284e+09        0.04
## OhlsonX9.y.2.               80 4236    8064492.14 1.290440e+08   636132.18
## OhlsonX5.y.2.               81 4236          0.15 3.500000e-01        0.00
## OhlsonX8.y.2.               82 4236          0.23 4.200000e-01        0.00
## D_AR_by_OpIncome            83 4236          3.10 2.073000e+01        0.13
## D_FB_Plus_OpInc_ByFB        84 4236          2.46 4.143000e+01       -0.08
## D_CurrentRatio              85 4236          0.02 2.760000e+00       -0.09
## D_Debt2Equity               86 4236         -4.02 4.692000e+01       -0.05
## D_LiabFundBalRatio          87 4236         -4.45 4.788000e+01       -0.07
## D_DaysSalesOutstanding      88 4236         -0.73 7.051000e+01       -0.02
## D_LaborCompRatio            89 4236          0.07 4.400000e-01        0.02
## D_OpProfitMargin            90 4236         -0.01 3.010000e+00        0.00
## D_DaysCashOnHand            91 4236         29.88 3.736800e+02        0.00
## D_BedUtil                   92 4236          0.06 3.800000e-01       -0.01
## D_AdjPxDays                 93 4236          0.06 8.700000e-01        0.01
## D_Alt1Ohls3                 94 4236  -19134537.39 1.384394e+09       -0.08
## D_AltmanX2                  95 4236   20618748.05 1.156503e+09       -0.09
## D_AltmanX3                  96 4236   10400346.95 5.297259e+08       -0.07
## D_AltmanX4                  97 4236 -216892581.02 1.670471e+10       -0.23
## D_OhlsonX1                  98 4236          0.00 1.100000e-01        0.00
## D_OhlsonX2                  99 4236  -11367071.42 7.851221e+08        0.07
## D_OhlsonX4                 100 4236          0.47 3.850000e+00        0.10
## D_OhlsonX6                 101 4236   16372233.04 8.568653e+08        0.03
## D_OhlsonX7                 102 4236   62284193.49 2.419069e+09       -0.12
## D_OhlsonX9                 103 4236     640468.32 3.574244e+07       -0.12
## NegLiab.y.1.               104 4236          0.04 1.900000e-01        0.00
## NegLiab.y.2.               105 4236          0.04 1.900000e-01        0.00
##                              trimmed        mad           min          max
## Bankrupt                        0.50       0.74  0.000000e+00 1.000000e+00
## Year                         2014.81       4.45  2.008000e+03 2.021000e+03
## AR_by_OpIncome                  2.72       2.72  0.000000e+00 8.590000e+00
## FB_Plus_OpInc_ByFB              1.14       0.41 -4.289000e+01 6.986900e+02
## PercentMedicaidDays             0.08       0.04  0.000000e+00 8.300000e-01
## PercentMedicareDays             0.31       0.11  0.000000e+00 8.300000e-01
## CurrentRatio                    1.49       1.11 -7.403000e+01 7.098050e+03
## Debt2Equity                    -0.14       0.94 -1.922500e+03 4.077900e+02
## DaysSalesOutstanding           53.10      14.42 -1.972370e+03 2.772490e+03
## LaborCompRatio                  0.49       0.13  1.000000e-02 6.340000e+00
## OpProfitMargin                 -0.08       0.13 -1.046000e+01 8.000000e-01
## DaysCashOnHand                 18.80      18.65 -7.385700e+02 3.060150e+03
## BedUtil                         0.43       0.21  0.000000e+00 1.000000e+00
## AdjPxDays                       4.66       2.84  0.000000e+00 1.258200e+02
## Alt1Ohls3                       0.08       0.23 -2.069512e+10 1.716643e+10
## AltmanX2                       -0.03       0.15 -2.401988e+10 2.003558e+09
## AltmanX3                       -0.03       0.16 -3.706881e+09 1.405591e+09
## AltmanX4                   239864.48       0.27 -1.500000e+11 1.520000e+11
## OhlsonX1                       11.38       1.20 -1.115000e+01 1.724000e+01
## OhlsonX2                        0.64       0.46 -3.619138e+10 4.035141e+09
## OhlsonX4                        0.81       0.56 -2.381000e+01 3.551000e+01
## OhlsonX6                       -0.01       0.12 -2.217599e+09 2.003558e+09
## OhlsonX7                   157009.50       0.28 -1.000000e+11 2.474888e+10
## OhlsonX9                   852947.95 7783569.19 -1.778187e+09 2.986955e+09
## OhlsonX5                        0.11       0.00  0.000000e+00 1.000000e+00
## OhlsonX8                        0.41       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.14       0.00  0.000000e+00 1.000000e+00
## HC1                             0.00       0.00  0.000000e+00 1.000000e+00
## HC2                             0.07       0.00  0.000000e+00 1.000000e+00
## HC4                             0.03       0.00  0.000000e+00 1.000000e+00
## HC5                             0.00       0.00  0.000000e+00 1.000000e+00
## AR_by_OpIncome.y.1.             2.42       2.67  0.000000e+00 8.600000e+00
## FB_Plus_OpInc_ByFB.y.1.         1.02       0.36 -2.297900e+02 6.417900e+02
## PercentMedicaidDays.y.1.        0.08       0.04  0.000000e+00 8.300000e-01
## PercentMedicareDays.y.1.        0.31       0.11  0.000000e+00 8.300000e-01
## CurrentRatio.y.1.               1.53       1.17 -1.879700e+02 1.482250e+03
## Debt2Equity.y.1.                0.50       0.61 -6.275700e+02 2.403630e+03
## DaysSalesOutstanding.y.1.      51.96      13.34 -1.647780e+03 2.681920e+03
## LaborCompRatio.y.1.             0.48       0.13 -4.900000e-01 1.740000e+00
## OpProfitMargin.y.1.            -0.07       0.12 -2.650000e+00 3.420000e+00
## DaysCashOnHand.y.1.            19.38      19.31 -1.292660e+03 2.814090e+03
## BedUtil.y.1.                    0.44       0.23  0.000000e+00 1.000000e+00
## AdjPxDays.y.1.                  4.71       3.19  0.000000e+00 1.415600e+02
## Alt1Ohls3.y.1.                  0.07       0.21 -1.393858e+10 3.015305e+08
## AltmanX2.y.1.                  -0.03       0.12 -1.398103e+10 2.097515e+08
## AltmanX3.y.1.                  -0.01       0.15 -1.542306e+09 5.250694e+08
## AltmanX4.y.1.                   0.05       0.20 -1.602656e+10 2.825674e+10
## OhlsonX1.y.1.                  11.38       1.22 -1.115000e+01 1.712000e+01
## OhlsonX2.y.1.                   0.60       0.42 -2.483980e+07 3.917888e+09
## OhlsonX4.y.1.                   0.80       0.53 -5.212000e+01 6.172000e+01
## OhlsonX6.y.1.                  -0.01       0.10 -1.789527e+09 2.097517e+08
## OhlsonX7.y.1.                   0.13       0.27 -7.165679e+09 2.558153e+10
## OhlsonX9.y.1.              324416.75 6338759.93 -1.308272e+09 1.455687e+09
## OhlsonX5.y.1.                   0.07       0.00  0.000000e+00 1.000000e+00
## OhlsonX8.y.1.                   0.43       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.             2.66       2.51  1.000000e-02 8.600000e+00
## FB_Plus_OpInc_ByFB.y.2.         0.91       0.26 -1.977600e+02 9.611000e+01
## PercentMedicaidDays.y.2.        0.08       0.04  0.000000e+00 8.300000e-01
## PercentMedicareDays.y.2.        0.31       0.11  0.000000e+00 8.300000e-01
## CurrentRatio.y.2.               1.83       1.27 -9.944000e+01 2.763400e+02
## Debt2Equity.y.2.                0.60       0.54 -2.681400e+03 4.554200e+02
## DaysSalesOutstanding.y.2.      52.44      13.49 -1.931850e+03 2.455250e+03
## LaborCompRatio.y.2.             0.47       0.13  1.000000e-02 4.580000e+00
## OpProfitMargin.y.2.            -0.05       0.10 -9.570000e+00 1.050000e+00
## DaysCashOnHand.y.2.            20.43      19.69 -1.576700e+03 2.385800e+03
## BedUtil.y.2.                    0.45       0.22  1.000000e-02 1.000000e+00
## AdjPxDays.y.2.                  4.81       3.26  0.000000e+00 1.372600e+02
## Alt1Ohls3.y.2.                  0.09       0.20 -1.303108e+10 1.546664e+09
## AltmanX2.y.2.                   0.02       0.10 -5.695970e+10 7.113183e+08
## AltmanX3.y.2.                   0.01       0.11 -3.464660e+09 4.765823e+09
## AltmanX4.y.2.                   0.18       0.18 -9.235900e+09 2.753928e+10
## OhlsonX1.y.2.                  11.39       1.22 -1.115000e+01 1.700000e+01
## OhlsonX2.y.2.                   0.57       0.39 -6.485320e+07 6.737484e+09
## OhlsonX4.y.2.                   0.74       0.49 -5.975000e+01 1.675990e+03
## OhlsonX6.y.2.                   0.01       0.09 -2.700965e+09 1.998557e+10
## OhlsonX7.y.2.                   0.11       0.20 -1.108916e+10 2.366226e+10
## OhlsonX9.y.2.             3076498.33 6780857.60 -6.091252e+08 5.228494e+09
## OhlsonX5.y.2.                   0.06       0.00  0.000000e+00 1.000000e+00
## OhlsonX8.y.2.                   0.16       0.00  0.000000e+00 1.000000e+00
## D_AR_by_OpIncome                1.27       0.94 -1.000000e+00 1.245000e+03
## D_FB_Plus_OpInc_ByFB           -0.27       0.29 -9.690000e+02 6.228300e+02
## D_CurrentRatio                 -0.02       0.34 -1.260800e+02 2.300000e+01
## D_Debt2Equity                  -0.17       0.53 -7.519800e+02 1.721900e+02
## D_LiabFundBalRatio             -0.13       0.44 -7.742200e+02 1.197100e+02
## D_DaysSalesOutstanding          0.02       0.19 -4.557000e+03 1.969000e+01
## D_LaborCompRatio                0.02       0.07 -5.670000e+00 1.500000e+01
## D_OpProfitMargin                0.04       0.76 -1.010000e+02 4.400000e+01
## D_DaysCashOnHand                0.54       0.72 -1.522800e+04 1.694500e+04
## D_BedUtil                       0.00       0.09 -1.000000e+00 3.860000e+00
## D_AdjPxDays                     0.01       0.09 -9.500000e-01 5.420000e+01
## D_Alt1Ohls3                    -0.15       0.66 -8.997879e+10 3.052270e+09
## D_AltmanX2                     -0.03       1.55 -8.772930e+03 7.506213e+10
## D_AltmanX3                     -0.22       0.79 -1.539000e+03 3.406117e+10
## D_AltmanX4                     -0.25       1.42 -9.380000e+11 4.500000e+11
## D_OhlsonX1                      0.00       0.01 -2.290000e+00 1.310000e+00
## D_OhlsonX2                      0.08       0.18 -5.097377e+10 1.882362e+09
## D_OhlsonX4                      0.14       0.41 -1.045000e+02 1.050000e+02
## D_OhlsonX6                      0.12       1.14 -8.772930e+03 5.543998e+10
## D_OhlsonX7                     -0.26       0.82 -5.342444e+10 1.330000e+11
## D_OhlsonX9                     -0.12       1.56 -3.247753e+08 2.107294e+09
## NegLiab.y.1.                    0.00       0.00  0.000000e+00 1.000000e+00
## NegLiab.y.2.                    0.00       0.00  0.000000e+00 1.000000e+00
##                                  range   skew kurtosis           se         IQR
## Bankrupt                  1.000000e+00   0.00    -2.00         0.01        1.00
## Year                      1.300000e+01  -0.10    -0.90         0.05        6.00
## AR_by_OpIncome            8.590000e+00   0.60    -0.63         0.04        3.54
## FB_Plus_OpInc_ByFB        7.415800e+02  12.34   162.31         0.66        0.62
## PercentMedicaidDays       8.300000e-01   2.05     4.91         0.00        0.09
## PercentMedicareDays       8.300000e-01   0.58     0.57         0.00        0.15
## CurrentRatio              7.172080e+03  63.77  4113.48         1.69        1.56
## Debt2Equity               2.330290e+03 -12.22   160.72         1.83        1.44
## DaysSalesOutstanding      4.744860e+03   6.02   418.26         1.32       22.34
## LaborCompRatio            6.330000e+00   9.55   110.29         0.01        0.18
## OpProfitMargin            1.126000e+01 -10.25   121.45         0.01        0.18
## DaysCashOnHand            3.798720e+03  12.43   244.04         1.65       32.49
## BedUtil                   1.000000e+00   0.29    -0.66         0.00        0.29
## AdjPxDays                 1.258200e+02   4.48    34.92         0.12        4.51
## Alt1Ohls3                 3.786155e+10 -13.74   829.22   8592432.61        0.31
## AltmanX2                  2.602344e+10 -63.13  4064.17   5726931.91        0.19
## AltmanX3                  5.112472e+09 -34.87  1676.91   1138388.08        0.21
## AltmanX4                  3.020000e+11   1.40  1243.65  57820773.60        0.41
## OhlsonX1                  2.839000e+01  -5.65    69.54         0.03        1.68
## OhlsonX2                  4.022652e+10 -49.95  2699.51   9713938.83        0.66
## OhlsonX4                  5.932000e+01  -0.57    59.21         0.03        0.89
## OhlsonX6                  4.221157e+09 -13.07   868.64    975854.79        0.17
## OhlsonX7                  1.247489e+11 -29.92  1674.62  29890728.22        0.45
## OhlsonX9                  4.765142e+09   5.59   342.27   1444367.29 11402544.69
## OhlsonX5                  1.000000e+00   1.57     0.48         0.01        0.00
## OhlsonX8                  1.000000e+00   0.29    -1.92         0.01        1.00
## Govt                      1.000000e+00   3.23     8.44         0.00        0.00
## Urban                     1.000000e+00   3.48    10.09         0.00        0.00
## ForProfit                 1.000000e+00   1.41    -0.02         0.01        0.00
## HC1                       1.000000e+00   3.86    12.93         0.00        0.00
## HC2                       1.000000e+00   1.86     1.45         0.01        0.00
## HC4                       1.000000e+00   2.32     3.36         0.01        0.00
## HC5                       1.000000e+00   3.33     9.10         0.00        0.00
## AR_by_OpIncome.y.1.       8.600000e+00   0.72    -0.54         0.04        3.92
## FB_Plus_OpInc_ByFB.y.1.   8.715800e+02  34.33  1887.21         0.19        0.48
## PercentMedicaidDays.y.1.  8.300000e-01   2.05     4.91         0.00        0.09
## PercentMedicareDays.y.1.  8.300000e-01   0.58     0.57         0.00        0.15
## CurrentRatio.y.1.         1.670220e+03  32.03  1615.51         0.45        1.67
## Debt2Equity.y.1.          3.031200e+03  39.00  1763.03         0.81        0.98
## DaysSalesOutstanding.y.1. 4.329700e+03   8.94   567.38         1.14       19.33
## LaborCompRatio.y.1.       2.230000e+00   0.80     3.63         0.00        0.18
## OpProfitMargin.y.1.       6.070000e+00  -1.39    36.30         0.00        0.17
## DaysCashOnHand.y.1.       4.106750e+03  10.36   242.02         1.43       36.40
## BedUtil.y.1.              1.000000e+00   0.18    -0.80         0.00        0.31
## AdjPxDays.y.1.            1.415600e+02   4.87    45.67         0.12        4.81
## Alt1Ohls3.y.1.            1.424011e+10 -31.58  1047.91   5668108.90        0.29
## AltmanX2.y.1.             1.419078e+10 -61.84  3934.68   3360650.76        0.16
## AltmanX3.y.1.             2.067376e+09 -32.71  1596.55    476667.22        0.20
## AltmanX4.y.1.             4.428330e+10   1.87   103.33  23021770.62        0.29
## OhlsonX1.y.1.             2.827000e+01  -4.79    65.24         0.03        1.68
## OhlsonX2.y.1.             3.942728e+09  37.42  1498.03   1330380.35        0.57
## OhlsonX4.y.1.             1.138400e+02   0.95   192.21         0.04        0.85
## OhlsonX6.y.1.             1.999279e+09 -40.82  1924.56    527777.12        0.14
## OhlsonX7.y.1.             3.274721e+10  10.49   143.82  17688600.46        0.40
## OhlsonX9.y.1.             2.763959e+09  -0.54   178.64   1105542.68  9672174.75
## OhlsonX5.y.1.             1.000000e+00   1.92     1.71         0.01        0.00
## OhlsonX8.y.1.             1.000000e+00   0.24    -1.94         0.01        1.00
## HC4_5.y.1.                1.000000e+00   1.54     0.36         0.01        0.00
## AR_by_OpIncome.y.2.       8.600000e+00   0.71    -0.48         0.04        3.46
## FB_Plus_OpInc_ByFB.y.2.   2.938700e+02  -8.64   140.62         0.12        0.37
## PercentMedicaidDays.y.2.  8.300000e-01   2.05     4.91         0.00        0.09
## PercentMedicareDays.y.2.  8.300000e-01   0.58     0.57         0.00        0.15
## CurrentRatio.y.2.         3.757800e+02  24.02   860.97         0.11        1.90
## Debt2Equity.y.2.          3.136820e+03 -49.54  2991.83         0.69        0.97
## DaysSalesOutstanding.y.2. 4.387100e+03   6.14   635.66         1.08       19.83
## LaborCompRatio.y.2.       4.570000e+00   4.80   107.57         0.00        0.18
## OpProfitMargin.y.2.       1.062000e+01 -12.60   401.93         0.00        0.13
## DaysCashOnHand.y.2.       3.962500e+03   7.86   189.07         1.38       38.35
## BedUtil.y.2.              9.900000e-01   0.17    -0.75         0.00        0.29
## AdjPxDays.y.2.            1.372500e+02   4.74    44.06         0.12        4.90
## Alt1Ohls3.y.2.            1.457774e+10 -12.87   201.49   8646286.95        0.27
## AltmanX2.y.2.             5.767102e+10 -43.27  1940.71  18178932.05        0.12
## AltmanX3.y.2.             8.230483e+09  -7.93   150.18   3701012.29        0.15
## AltmanX4.y.2.             3.677518e+10   6.58   114.97  18962659.29        0.30
## OhlsonX1.y.2.             2.815000e+01  -5.53    47.31         0.04        1.64
## OhlsonX2.y.2.             6.802337e+09  11.16   132.30   6971184.25        0.53
## OhlsonX4.y.2.             1.735740e+03  11.50   139.16         1.68        0.75
## OhlsonX6.y.2.             2.268653e+10  40.00  2331.57   5484968.19        0.11
## OhlsonX7.y.2.             3.475141e+10  10.04   142.63  17489314.72        0.29
## OhlsonX9.y.2.             5.837619e+09  32.44  1280.52   1982713.29 11026885.91
## OhlsonX5.y.2.             1.000000e+00   1.99     1.95         0.01        0.00
## OhlsonX8.y.2.             1.000000e+00   1.31    -0.29         0.01        0.00
## D_AR_by_OpIncome          1.246000e+03  51.44  3043.27         0.32        2.63
## D_FB_Plus_OpInc_ByFB      1.591830e+03   6.94   193.13         0.64        0.56
## D_CurrentRatio            1.490800e+02 -27.99  1147.39         0.04        0.48
## D_Debt2Equity             9.241600e+02 -12.06   157.88         0.72        0.78
## D_LiabFundBalRatio        8.939400e+02 -12.37   163.19         0.74        0.63
## D_DaysSalesOutstanding    4.576690e+03 -63.80  4114.58         1.08        0.26
## D_LaborCompRatio          2.067000e+01  13.44   357.73         0.01        0.10
## D_OpProfitMargin          1.450000e+02 -12.59   396.31         0.05        1.07
## D_DaysCashOnHand          3.217300e+04   6.43  1650.48         5.74        1.23
## D_BedUtil                 4.860000e+00   5.53    41.55         0.01        0.13
## D_AdjPxDays               5.515000e+01  56.12  3463.10         0.01        0.13
## D_Alt1Ohls3               9.303106e+10 -64.77  4206.18  21270693.96        0.90
## D_AltmanX2                7.506214e+10  64.51  4181.73  17769239.79        2.05
## D_AltmanX3                3.406117e+10  62.88  4028.91   8139040.93        1.11
## D_AltmanX4                1.388000e+12 -38.22  2482.19 256661706.59        1.92
## D_OhlsonX1                3.590000e+00 -16.42   318.43         0.00        0.01
## D_OhlsonX2                5.285613e+10 -64.56  4187.81  12063108.78        0.25
## D_OhlsonX4                2.095000e+02   1.40   295.52         0.06        0.57
## D_OhlsonX6                5.543999e+10  63.93  4129.29  13165415.93        1.55
## D_OhlsonX7                1.864244e+11  38.84  2238.98  37168100.53        1.15
## D_OhlsonX9                2.432069e+09  52.31  2955.69    549169.30        2.11
## NegLiab.y.1.              1.000000e+00   4.86    21.67         0.00        0.00
## NegLiab.y.2.              1.000000e+00   4.86    21.67         0.00        0.00
##                                 Q0.25      Q0.75
## Bankrupt                         0.00       1.00
## Year                          2012.00    2018.00
## AR_by_OpIncome                   0.95       4.50
## FB_Plus_OpInc_ByFB               0.82       1.44
## PercentMedicaidDays              0.03       0.12
## PercentMedicareDays              0.24       0.39
## CurrentRatio                     0.71       2.27
## Debt2Equity                     -0.86       0.58
## DaysSalesOutstanding            41.16      63.49
## LaborCompRatio                   0.39       0.57
## OpProfitMargin                  -0.17       0.01
## DaysCashOnHand                   1.64      34.13
## BedUtil                          0.29       0.58
## AdjPxDays                        2.29       6.80
## Alt1Ohls3                       -0.07       0.24
## AltmanX2                        -0.13       0.06
## AltmanX3                        -0.13       0.08
## AltmanX4                        -0.17       0.24
## OhlsonX1                        10.56      12.24
## OhlsonX2                         0.32       0.98
## OhlsonX4                         0.38       1.27
## OhlsonX6                        -0.10       0.07
## OhlsonX7                        -0.17       0.28
## OhlsonX9                  -5082187.50 6320357.20
## 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.              0.56       4.48
## FB_Plus_OpInc_ByFB.y.1.          0.76       1.24
## PercentMedicaidDays.y.1.         0.03       0.12
## PercentMedicareDays.y.1.         0.24       0.39
## CurrentRatio.y.1.                0.71       2.38
## Debt2Equity.y.1.                 0.01       0.99
## DaysSalesOutstanding.y.1.       42.57      61.90
## LaborCompRatio.y.1.              0.39       0.57
## OpProfitMargin.y.1.             -0.15       0.02
## DaysCashOnHand.y.1.              1.52      37.91
## BedUtil.y.1.                     0.29       0.60
## AdjPxDays.y.1.                   2.20       7.01
## Alt1Ohls3.y.1.                  -0.07       0.22
## AltmanX2.y.1.                   -0.10       0.06
## AltmanX3.y.1.                   -0.11       0.09
## AltmanX4.y.1.                   -0.14       0.15
## OhlsonX1.y.1.                   10.55      12.23
## OhlsonX2.y.1.                    0.33       0.90
## OhlsonX4.y.1.                    0.36       1.21
## OhlsonX6.y.1.                   -0.07       0.07
## OhlsonX7.y.1.                   -0.15       0.25
## OhlsonX9.y.1.             -4659499.25 5012675.50
## 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.              1.02       4.48
## FB_Plus_OpInc_ByFB.y.2.          0.73       1.10
## PercentMedicaidDays.y.2.         0.03       0.12
## PercentMedicareDays.y.2.         0.24       0.39
## CurrentRatio.y.2.                0.90       2.80
## Debt2Equity.y.2.                 0.08       1.05
## DaysSalesOutstanding.y.2.       42.92      62.74
## LaborCompRatio.y.2.              0.38       0.56
## OpProfitMargin.y.2.             -0.11       0.02
## DaysCashOnHand.y.2.              0.57      38.92
## BedUtil.y.2.                     0.30       0.59
## AdjPxDays.y.2.                   2.26       7.16
## Alt1Ohls3.y.2.                  -0.03       0.24
## AltmanX2.y.2.                   -0.04       0.08
## AltmanX3.y.2.                   -0.07       0.08
## AltmanX4.y.2.                   -0.05       0.25
## OhlsonX1.y.2.                   10.56      12.20
## OhlsonX2.y.2.                    0.31       0.84
## OhlsonX4.y.2.                    0.33       1.08
## OhlsonX6.y.2.                   -0.04       0.07
## OhlsonX7.y.2.                   -0.09       0.20
## OhlsonX9.y.2.             -2338967.47 8687918.44
## OhlsonX5.y.2.                    0.00       0.00
## OhlsonX8.y.2.                    0.00       0.00
## D_AR_by_OpIncome                -0.22       2.40
## D_FB_Plus_OpInc_ByFB            -0.53       0.03
## D_CurrentRatio                  -0.30       0.19
## D_Debt2Equity                   -0.56       0.23
## D_LiabFundBalRatio              -0.44       0.19
## D_DaysSalesOutstanding          -0.14       0.12
## D_LaborCompRatio                -0.03       0.06
## D_OpProfitMargin                -0.50       0.57
## D_DaysCashOnHand                -0.34       0.89
## D_BedUtil                       -0.07       0.06
## D_AdjPxDays                     -0.05       0.07
## D_Alt1Ohls3                     -0.63       0.27
## D_AltmanX2                      -1.05       1.00
## D_AltmanX3                      -0.77       0.34
## D_AltmanX4                      -1.17       0.76
## D_OhlsonX1                      -0.01       0.01
## D_OhlsonX2                      -0.05       0.20
## D_OhlsonX4                      -0.14       0.43
## D_OhlsonX6                      -0.66       0.89
## D_OhlsonX7                      -0.83       0.32
## D_OhlsonX9                      -1.17       0.94
## NegLiab.y.1.                     0.00       0.00
## NegLiab.y.2.                     0.00       0.00
describe(train4, IQR = TRUE, quant = c(.25, .75))
##                           vars    n          mean           sd     median
## Bankrupt                     1 4840          0.50 5.000000e-01       0.50
## Year                         2 4840       2014.88 3.490000e+00    2015.00
## AR_by_OpIncome               3 4840          2.86 2.450000e+00       2.32
## FB_Plus_OpInc_ByFB           4 4840          9.79 6.531000e+01       1.03
## PercentMedicaidDays          5 4840          0.10 9.000000e-02       0.06
## PercentMedicareDays          6 4840          0.32 1.100000e-01       0.31
## CurrentRatio                 7 4840          3.48 1.030900e+02       1.24
## Debt2Equity                  8 4840        -24.06 1.801600e+02       0.25
## DaysSalesOutstanding         9 4840         54.61 7.688000e+01      49.86
## LaborCompRatio              10 4840          0.52 4.100000e-01       0.46
## OpProfitMargin              11 4840         -0.14 7.200000e-01      -0.06
## DaysCashOnHand              12 4840         32.40 1.032300e+02      10.32
## BedUtil                     13 4840          0.44 1.800000e-01       0.42
## AdjPxDays                   14 4840          6.55 7.650000e+00       4.37
## Alt1Ohls3                   15 4840  -10661656.73 4.772885e+08       0.08
## AltmanX2                    16 4840   -6460546.29 3.525166e+08      -0.01
## AltmanX3                    17 4840   -1133186.54 4.873188e+07       0.00
## AltmanX4                    18 4840  183395126.25 3.584666e+09       0.00
## OhlsonX1                    19 4840         11.51 1.730000e+00      11.47
## OhlsonX2                    20 4840   -7950198.41 5.916717e+08       0.61
## OhlsonX4                    21 4840          0.98 9.650000e+00       0.71
## OhlsonX6                    22 4840   -1430765.48 5.994380e+07       0.00
## OhlsonX7                    23 4840  204722056.33 1.984547e+09       0.04
## OhlsonX9                    24 4840    3285195.81 7.768034e+07 -632731.50
## OhlsonX5                    25 4840          0.15 3.600000e-01       0.00
## OhlsonX8                    26 4840          0.37 4.800000e-01       0.00
## Govt                        27 4840          0.08 2.700000e-01       0.00
## Urban                       28 4840          0.06 2.400000e-01       0.00
## ForProfit                   29 4840          0.24 4.200000e-01       0.00
## HC1                         30 4840          0.04 1.900000e-01       0.00
## HC2                         31 4840          0.14 3.500000e-01       0.00
## HC4                         32 4840          0.13 3.300000e-01       0.00
## HC5                         33 4840          0.06 2.400000e-01       0.00
## AR_by_OpIncome.y.1.         34 4840          2.81 2.400000e+00       2.31
## FB_Plus_OpInc_ByFB.y.1.     35 4840          1.54 2.376000e+01       1.00
## PercentMedicaidDays.y.1.    36 4840          0.10 9.000000e-02       0.06
## PercentMedicareDays.y.1.    37 4840          0.32 1.100000e-01       0.31
## CurrentRatio.y.1.           38 4840          1.65 2.874000e+01       1.44
## Debt2Equity.y.1.            39 4840          2.18 8.100000e+01       0.32
## DaysSalesOutstanding.y.1.   40 4840         54.91 7.054000e+01      50.32
## LaborCompRatio.y.1.         41 4840          0.48 1.500000e-01       0.45
## OpProfitMargin.y.1.         42 4840         -0.08 2.300000e-01      -0.06
## DaysCashOnHand.y.1.         43 4840         33.82 9.438000e+01      13.41
## BedUtil.y.1.                44 4840          0.44 1.900000e-01       0.43
## AdjPxDays.y.1.              45 4840          6.61 7.400000e+00       4.62
## Alt1Ohls3.y.1.              46 4840   -7360831.70 2.711859e+08       0.11
## AltmanX2.y.1.               47 4840   -3357753.24 2.026158e+08      -0.01
## AltmanX3.y.1.               48 4840     -79429.69 1.448849e+07       0.00
## AltmanX4.y.1.               49 4840  162621739.43 1.296226e+09      -0.01
## OhlsonX1.y.1.               50 4840         11.54 1.530000e+00      11.51
## OhlsonX2.y.1.               51 4840    1845510.45 7.497649e+07       0.61
## OhlsonX4.y.1.               52 4840          0.80 3.660000e+00       0.63
## OhlsonX6.y.1.               53 4840    -295891.73 1.774943e+07       0.00
## OhlsonX7.y.1.               54 4840  207206546.12 1.291454e+09       0.01
## OhlsonX9.y.1.               55 4840    2461505.44 6.320422e+07 -317431.00
## OhlsonX5.y.1.               56 4840          0.13 3.400000e-01       0.00
## OhlsonX8.y.1.               57 4840          0.30 4.600000e-01       0.00
## HC4_5.y.1.                  58 4840          0.19 3.900000e-01       0.00
## AR_by_OpIncome.y.2.         59 4840          3.07 2.410000e+00       2.57
## FB_Plus_OpInc_ByFB.y.2.     60 4840          0.60 9.630000e+00       0.99
## PercentMedicaidDays.y.2.    61 4840          0.10 9.000000e-02       0.06
## PercentMedicareDays.y.2.    62 4840          0.32 1.100000e-01       0.31
## CurrentRatio.y.2.           63 4840          3.16 6.391000e+01       1.58
## Debt2Equity.y.2.            64 4840          0.45 6.171000e+01       0.41
## DaysSalesOutstanding.y.2.   65 4840         57.13 6.566000e+01      51.45
## LaborCompRatio.y.2.         66 4840          0.46 1.600000e-01       0.44
## OpProfitMargin.y.2.         67 4840         -0.06 2.600000e-01      -0.04
## DaysCashOnHand.y.2.         68 4840         32.89 8.975000e+01      13.25
## BedUtil.y.2.                69 4840          0.45 1.900000e-01       0.43
## AdjPxDays.y.2.              70 4840          6.70 7.310000e+00       4.76
## Alt1Ohls3.y.2.              71 4840  -39785659.86 4.690913e+08       0.12
## AltmanX2.y.2.               72 4840  -29720361.92 1.080758e+09       0.02
## AltmanX3.y.2.               73 4840  -14876852.28 2.071155e+08       0.02
## AltmanX4.y.2.               74 4840   11885976.70 3.210470e+09       0.04
## OhlsonX1.y.2.               75 4840         11.44 2.060000e+00      11.56
## OhlsonX2.y.2.               76 4840   34771914.03 3.882113e+08       0.59
## OhlsonX4.y.2.               77 4840         11.20 1.087700e+02       0.59
## OhlsonX6.y.2.               78 4840   -8707776.04 3.263130e+08       0.02
## OhlsonX7.y.2.               79 4840  207002420.69 1.319767e+09       0.03
## OhlsonX9.y.2.               80 4840    7232720.56 1.342843e+08 1531788.79
## OhlsonX5.y.2.               81 4840          0.12 3.300000e-01       0.00
## OhlsonX8.y.2.               82 4840          0.29 4.500000e-01       0.00
## D_AR_by_OpIncome            83 4840          3.43 2.011000e+01       0.01
## D_FB_Plus_OpInc_ByFB        84 4840          6.80 6.023000e+01      -0.07
## D_CurrentRatio              85 4840         -0.20 3.020000e+00      -0.14
## D_Debt2Equity               86 4840         -7.33 7.211000e+01      -0.01
## D_LiabFundBalRatio          87 4840         -9.89 7.527000e+01      -0.05
## D_DaysSalesOutstanding      88 4840         -0.64 6.644000e+01       0.00
## D_LaborCompRatio            89 4840          0.05 4.400000e-01       0.00
## D_OpProfitMargin            90 4840         -0.13 2.860000e+00      -0.07
## D_DaysCashOnHand            91 4840         28.96 3.121900e+02      -0.08
## D_BedUtil                   92 4840          0.05 8.500000e-01      -0.02
## D_AdjPxDays                 93 4840         12.13 8.430800e+02      -0.01
## D_Alt1Ohls3                 94 4840  -17495194.36 1.296168e+09       0.00
## D_AltmanX2                  95 4840   18010366.25 1.081946e+09      -0.59
## D_AltmanX3                  96 4840    9150360.69 4.955867e+08      -0.17
## D_AltmanX4                  97 4840 -756866486.43 4.250492e+10      -0.69
## D_OhlsonX1                  98 4840          0.00 1.100000e-01       0.00
## D_OhlsonX2                  99 4840   -4544295.25 8.251993e+08       0.04
## D_OhlsonX4                 100 4840          0.42 3.420000e+00       0.15
## D_OhlsonX6                 101 4840   14360287.92 8.016276e+08      -0.37
## D_OhlsonX7                 102 4840  101096745.66 3.338921e+09      -0.18
## D_OhlsonX9                 103 4840     560539.66 3.343812e+07      -0.66
## NegLiab.y.1.               104 4840          0.04 1.900000e-01       0.00
## NegLiab.y.2.               105 4840          0.04 2.000000e-01       0.00
##                              trimmed         mad           min          max
## Bankrupt                        0.50        0.74  0.000000e+00 1.000000e+00
## Year                         2014.91        4.45  2.008000e+03 2.021000e+03
## AR_by_OpIncome                  2.62        3.04  0.000000e+00 8.540000e+00
## FB_Plus_OpInc_ByFB              1.02        0.33 -3.383000e+01 6.986900e+02
## PercentMedicaidDays             0.08        0.05  0.000000e+00 8.400000e-01
## PercentMedicareDays             0.31        0.10  0.000000e+00 8.300000e-01
## CurrentRatio                    1.39        1.13 -4.645900e+02 7.098050e+03
## Debt2Equity                     0.18        0.87 -1.922500e+03 4.077900e+02
## DaysSalesOutstanding           51.28       14.22 -1.972370e+03 2.772490e+03
## LaborCompRatio                  0.47        0.14  1.000000e-02 6.340000e+00
## OpProfitMargin                 -0.06        0.14 -1.046000e+01 8.000000e-01
## DaysCashOnHand                 16.98       15.54 -7.541700e+02 3.060150e+03
## BedUtil                         0.43        0.21  0.000000e+00 1.000000e+00
## AdjPxDays                       5.01        3.28  0.000000e+00 8.219000e+01
## Alt1Ohls3                       0.04        0.28 -2.069512e+10 1.716643e+10
## AltmanX2                       -0.02        0.12 -2.401988e+10 2.003558e+09
## AltmanX3                       -0.01        0.16 -2.043670e+09 1.405591e+09
## AltmanX4                  2521651.45        0.22 -1.500000e+11 1.520000e+11
## OhlsonX1                       11.51        1.18 -1.115000e+01 1.724000e+01
## OhlsonX2                        0.66        0.49 -3.619138e+10 4.035141e+09
## OhlsonX4                        0.92        0.66 -6.426000e+02 6.905000e+01
## OhlsonX6                        0.00        0.12 -2.217599e+09 2.003558e+09
## OhlsonX7                  3540906.95        0.28 -1.000000e+11 2.906021e+10
## OhlsonX9                   824876.22  7971488.01 -1.528754e+09 1.524243e+09
## OhlsonX5                        0.06        0.00  0.000000e+00 1.000000e+00
## OhlsonX8                        0.34        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.17        0.00  0.000000e+00 1.000000e+00
## HC1                             0.00        0.00  0.000000e+00 1.000000e+00
## HC2                             0.05        0.00  0.000000e+00 1.000000e+00
## HC4                             0.03        0.00  0.000000e+00 1.000000e+00
## HC5                             0.00        0.00  0.000000e+00 1.000000e+00
## AR_by_OpIncome.y.1.             2.57        3.10  0.000000e+00 8.600000e+00
## FB_Plus_OpInc_ByFB.y.1.         0.96        0.35 -2.297900e+02 1.378650e+03
## PercentMedicaidDays.y.1.        0.08        0.05  0.000000e+00 8.400000e-01
## PercentMedicareDays.y.1.        0.31        0.10  0.000000e+00 8.300000e-01
## CurrentRatio.y.1.               1.58        1.17 -7.873100e+02 1.482250e+03
## Debt2Equity.y.1.                0.50        0.95 -6.275700e+02 4.467920e+03
## DaysSalesOutstanding.y.1.      52.31       14.98 -1.593290e+03 2.681920e+03
## LaborCompRatio.y.1.             0.47        0.14 -4.900000e-01 1.740000e+00
## OpProfitMargin.y.1.            -0.07        0.13 -6.890000e+00 3.420000e+00
## DaysCashOnHand.y.1.            19.73       19.88 -1.292660e+03 2.814090e+03
## BedUtil.y.1.                    0.44        0.22  0.000000e+00 1.000000e+00
## AdjPxDays.y.1.                  5.17        3.43  0.000000e+00 7.961000e+01
## Alt1Ohls3.y.1.                  0.09        0.21 -1.295576e+10 1.244798e+08
## AltmanX2.y.1.                  -0.02        0.12 -1.398103e+10 2.097515e+08
## AltmanX3.y.1.                  -0.02        0.15 -4.155656e+08 5.250694e+08
## AltmanX4.y.1.              532107.47        0.22 -2.914540e+10 2.825674e+10
## OhlsonX1.y.1.                  11.53        1.14 -1.115000e+01 1.712000e+01
## OhlsonX2.y.1.                   0.64        0.44 -2.483980e+07 3.917888e+09
## OhlsonX4.y.1.                   0.75        0.50 -1.835000e+02 6.172000e+01
## OhlsonX6.y.1.                  -0.01        0.11 -9.996727e+08 2.097517e+08
## OhlsonX7.y.1.              971013.62        0.26 -2.396372e+10 2.558153e+10
## OhlsonX9.y.1.             1130202.96  7089521.88 -1.293776e+09 1.455687e+09
## OhlsonX5.y.1.                   0.04        0.00  0.000000e+00 1.000000e+00
## OhlsonX8.y.1.                   0.25        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.             2.88        2.86  1.000000e-02 8.600000e+00
## FB_Plus_OpInc_ByFB.y.2.         0.97        0.28 -3.264500e+02 4.451800e+02
## PercentMedicaidDays.y.2.        0.08        0.05  0.000000e+00 8.400000e-01
## PercentMedicareDays.y.2.        0.31        0.10  0.000000e+00 8.300000e-01
## CurrentRatio.y.2.               1.75        1.11 -9.944000e+01 4.418520e+03
## Debt2Equity.y.2.                0.69        0.77 -3.255210e+03 4.554200e+02
## DaysSalesOutstanding.y.2.      52.81       14.74 -1.931850e+03 2.455250e+03
## LaborCompRatio.y.2.             0.45        0.13 -1.990000e+00 4.580000e+00
## OpProfitMargin.y.2.            -0.04        0.11 -9.570000e+00 8.190000e+00
## DaysCashOnHand.y.2.            20.32       19.63 -1.576700e+03 2.385800e+03
## BedUtil.y.2.                    0.44        0.21  0.000000e+00 1.000000e+00
## AdjPxDays.y.2.                  5.31        3.56  0.000000e+00 8.133000e+01
## Alt1Ohls3.y.2.                  0.12        0.16 -1.303108e+10 1.546664e+09
## AltmanX2.y.2.                   0.03        0.13 -5.695970e+10 1.100960e+09
## AltmanX3.y.2.                   0.01        0.12 -3.464660e+09 4.765823e+09
## AltmanX4.y.2.                   0.22        0.25 -1.540000e+11 1.140000e+11
## OhlsonX1.y.2.                  11.54        1.12 -1.115000e+01 1.700000e+01
## OhlsonX2.y.2.                   0.62        0.41 -1.329000e+01 6.737484e+09
## OhlsonX4.y.2.                   0.67        0.43 -9.859000e+01 1.675990e+03
## OhlsonX6.y.2.                   0.01        0.09 -2.700965e+09 1.998557e+10
## OhlsonX7.y.2.                   0.15        0.22 -2.319753e+10 3.100398e+10
## OhlsonX9.y.2.             3358581.97 10553157.86 -1.539479e+09 5.228494e+09
## OhlsonX5.y.2.                   0.03        0.00  0.000000e+00 1.000000e+00
## OhlsonX8.y.2.                   0.23        0.00  0.000000e+00 1.000000e+00
## D_AR_by_OpIncome                1.23        0.84 -1.000000e+00 1.245000e+03
## D_FB_Plus_OpInc_ByFB           -0.32        0.30 -9.690000e+02 6.228300e+02
## D_CurrentRatio                 -0.13        0.31 -1.260800e+02 2.300000e+01
## D_Debt2Equity                  -0.02        0.46 -7.519800e+02 3.553800e+02
## D_LiabFundBalRatio             -0.12        0.46 -1.422190e+03 1.197100e+02
## D_DaysSalesOutstanding          0.01        0.16 -4.557000e+03 5.583800e+02
## D_LaborCompRatio                0.00        0.08 -5.670000e+00 1.500000e+01
## D_OpProfitMargin               -0.07        0.84 -1.010000e+02 7.800000e+01
## D_DaysCashOnHand                0.03        0.70 -6.450000e+02 1.694500e+04
## D_BedUtil                      -0.01        0.10 -1.000000e+00 5.300000e+01
## D_AdjPxDays                    -0.01        0.08 -9.500000e-01 5.865316e+04
## D_Alt1Ohls3                     0.08        0.66 -8.997879e+10 3.052270e+09
## D_AltmanX2                     -0.60        1.54 -1.708382e+08 7.506213e+10
## D_AltmanX3                     -0.31        0.85 -1.539000e+03 3.406117e+10
## D_AltmanX4                     -0.85        1.68 -2.750000e+12 4.500000e+11
## D_OhlsonX1                      0.00        0.01 -2.310000e+00 1.310000e+00
## D_OhlsonX2                      0.06        0.18 -5.097377e+10 2.615652e+10
## D_OhlsonX4                      0.21        0.41 -1.045000e+02 1.050000e+02
## D_OhlsonX6                     -0.51        1.10 -8.772930e+03 5.543998e+10
## D_OhlsonX7                     -0.27        0.87 -5.342444e+10 1.700000e+11
## D_OhlsonX9                     -0.77        1.57 -3.247753e+08 2.107294e+09
## NegLiab.y.1.                    0.00        0.00  0.000000e+00 1.000000e+00
## NegLiab.y.2.                    0.00        0.00  0.000000e+00 1.000000e+00
##                                  range   skew kurtosis           se         IQR
## Bankrupt                  1.000000e+00   0.00    -2.00         0.01        1.00
## Year                      1.300000e+01  -0.13    -0.93         0.05        6.00
## AR_by_OpIncome            8.540000e+00   0.61    -0.76         0.04        3.92
## FB_Plus_OpInc_ByFB        7.325200e+02   8.25    70.07         0.94        0.43
## PercentMedicaidDays       8.400000e-01   1.98     5.65         0.00        0.09
## PercentMedicareDays       8.300000e-01   0.39     0.59         0.00        0.13
## CurrentRatio              7.562640e+03  67.40  4631.33         1.48        1.63
## Debt2Equity               2.330290e+03  -8.22    69.79         2.59        1.21
## DaysSalesOutstanding      4.744860e+03  11.38   554.15         1.11       19.95
## LaborCompRatio            6.330000e+00   9.24   101.22         0.01        0.20
## OpProfitMargin            1.126000e+01  -9.83   108.38         0.01        0.19
## DaysCashOnHand            3.814320e+03  12.27   250.46         1.48       32.84
## BedUtil                   1.000000e+00   0.31    -0.58         0.00        0.28
## AdjPxDays                 8.219000e+01   3.70    20.13         0.11        4.82
## Alt1Ohls3                 3.786155e+10 -13.49  1195.11   6860539.16        0.40
## AltmanX2                  2.602344e+10 -65.55  4448.71   5067069.85        0.17
## AltmanX3                  3.449261e+09 -21.76  1104.23    700471.54        0.21
## AltmanX4                  3.020000e+11   1.50  1323.15  51525957.70        0.38
## OhlsonX1                  2.839000e+01  -5.35    70.51         0.02        1.59
## OhlsonX2                  4.022652e+10 -53.33  3080.91   8504682.60        0.68
## OhlsonX4                  7.116500e+02 -61.29  4092.17         0.14        1.19
## OhlsonX6                  4.221157e+09 -13.94   963.68    861631.54        0.15
## OhlsonX7                  1.290602e+11 -23.93  1372.80  28525852.79        0.54
## OhlsonX9                  3.052997e+09  -2.72   180.34   1116576.38 11501100.25
## OhlsonX5                  1.000000e+00   1.94     1.77         0.01        0.00
## OhlsonX8                  1.000000e+00   0.54    -1.71         0.01        1.00
## Govt                      1.000000e+00   3.06     7.37         0.00        0.00
## Urban                     1.000000e+00   3.57    10.78         0.00        0.00
## ForProfit                 1.000000e+00   1.24    -0.46         0.01        0.00
## HC1                       1.000000e+00   4.91    22.07         0.00        0.00
## HC2                       1.000000e+00   2.07     2.29         0.00        0.00
## HC4                       1.000000e+00   2.23     2.99         0.00        0.00
## HC5                       1.000000e+00   3.67    11.47         0.00        0.00
## AR_by_OpIncome.y.1.       8.600000e+00   0.59    -0.74         0.03        3.98
## FB_Plus_OpInc_ByFB.y.1.   1.608440e+03  45.44  2467.51         0.34        0.48
## PercentMedicaidDays.y.1.  8.400000e-01   1.98     5.65         0.00        0.09
## PercentMedicareDays.y.1.  8.300000e-01   0.39     0.59         0.00        0.13
## CurrentRatio.y.1.         2.269560e+03  25.89  1608.80         0.41        1.65
## Debt2Equity.y.1.          5.095490e+03  43.89  2177.15         1.16        1.19
## DaysSalesOutstanding.y.1. 4.275210e+03  14.34   590.05         1.01       21.31
## LaborCompRatio.y.1.       2.230000e+00   0.81     3.01         0.00        0.20
## OpProfitMargin.y.1.       1.031000e+01  -6.83   192.05         0.00        0.17
## DaysCashOnHand.y.1.       4.106750e+03   9.71   218.27         1.36       38.95
## BedUtil.y.1.              1.000000e+00   0.21    -0.72         0.00        0.30
## AdjPxDays.y.1.            7.961000e+01   3.67    20.12         0.11        4.98
## Alt1Ohls3.y.1.            1.308024e+10 -40.25  1686.66   3898023.20        0.28
## AltmanX2.y.1.             1.419078e+10 -67.95  4677.45   2912397.78        0.17
## AltmanX3.y.1.             9.406350e+08   3.68   959.20    208257.39        0.20
## AltmanX4.y.1.             5.740214e+10   5.29   180.51  18631940.15        0.31
## OhlsonX1.y.1.             2.827000e+01  -3.91    59.28         0.02        1.54
## OhlsonX2.y.1.             3.942728e+09  46.19  2220.75   1077711.22        0.61
## OhlsonX4.y.1.             2.452200e+02 -28.34  1402.92         0.05        0.79
## OhlsonX6.y.1.             1.209424e+09 -43.76  2278.54    255130.07        0.16
## OhlsonX7.y.1.             4.954525e+10   7.77   143.66  18563343.19        0.41
## OhlsonX9.y.1.             2.749463e+09   2.27   205.46    908496.80 10432321.75
## OhlsonX5.y.1.             1.000000e+00   2.18     2.74         0.00        0.00
## OhlsonX8.y.1.             1.000000e+00   0.86    -1.25         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.600000e+00   0.49    -0.83         0.03        3.63
## FB_Plus_OpInc_ByFB.y.2.   7.716300e+02   9.52  1256.85         0.14        0.39
## PercentMedicaidDays.y.2.  8.400000e-01   1.98     5.65         0.00        0.09
## PercentMedicareDays.y.2.  8.300000e-01   0.39     0.59         0.00        0.13
## CurrentRatio.y.2.         4.517960e+03  68.16  4703.67         0.92        1.65
## Debt2Equity.y.2.          3.710630e+03 -47.20  2335.71         0.89        1.27
## DaysSalesOutstanding.y.2. 4.387100e+03  10.90   666.36         0.94       20.20
## LaborCompRatio.y.2.       6.570000e+00   3.57   113.53         0.00        0.19
## OpProfitMargin.y.2.       1.776000e+01  -4.70   544.95         0.00        0.15
## DaysCashOnHand.y.2.       3.962500e+03   8.02   184.41         1.29       38.64
## BedUtil.y.2.              1.000000e+00   0.23    -0.65         0.00        0.29
## AdjPxDays.y.2.            8.133000e+01   3.58    19.89         0.11        5.15
## Alt1Ohls3.y.2.            1.457774e+10 -14.78   267.31   6742713.86        0.22
## AltmanX2.y.2.             5.806066e+10 -48.96  2430.63  15534800.62        0.18
## AltmanX3.y.2.             8.230483e+09  -8.17   200.15   2977076.63        0.16
## AltmanX4.y.2.             2.680000e+11 -15.31  1461.77  46147259.09        0.48
## OhlsonX1.y.2.             2.815000e+01  -5.70    54.98         0.03        1.51
## OhlsonX2.y.2.             6.737484e+09  12.59   169.20   5580144.93        0.55
## OhlsonX4.y.2.             1.774580e+03  11.48   139.87         1.56        0.64
## OhlsonX6.y.2.             2.268653e+10  46.17  2918.48   4690419.08        0.13
## OhlsonX7.y.2.             5.420151e+10   8.93   171.07  18970310.24        0.33
## OhlsonX9.y.2.             6.767973e+09  27.90  1023.14   1930201.39 14246003.02
## OhlsonX5.y.2.             1.000000e+00   2.29     3.26         0.00        0.00
## OhlsonX8.y.2.             1.000000e+00   0.94    -1.12         0.01        1.00
## D_AR_by_OpIncome          1.246000e+03  49.43  3003.87         0.29        2.76
## D_FB_Plus_OpInc_ByFB      1.591830e+03   6.64    75.84         0.87        0.66
## D_CurrentRatio            1.490800e+02 -31.17  1212.29         0.04        0.42
## D_Debt2Equity             1.107350e+03  -7.76    64.77         1.04        0.62
## D_LiabFundBalRatio        1.541900e+03  -8.72    85.35         1.08        0.62
## D_DaysSalesOutstanding    5.115380e+03 -66.60  4567.51         0.96        0.22
## D_LaborCompRatio          2.067000e+01  12.78   327.51         0.01        0.10
## D_OpProfitMargin          1.790000e+02  -6.78   472.98         0.04        1.12
## D_DaysCashOnHand          1.759000e+04  35.21  1796.90         4.49        0.96
## D_BedUtil                 5.400000e+01  51.19  3163.71         0.01        0.13
## D_AdjPxDays               5.865410e+04  69.53  4832.99        12.12        0.11
## D_Alt1Ohls3               9.303106e+10 -69.08  4791.40  18631102.83        0.91
## D_AltmanX2                7.523297e+10  68.96  4778.93  15551884.04        2.07
## D_AltmanX3                3.406117e+10  67.22  4603.93   7123557.30        1.14
## D_AltmanX4                3.200000e+12 -57.93  3664.97 610965240.21        2.33
## D_OhlsonX1                3.620000e+00 -16.40   326.03         0.00        0.01
## D_OhlsonX2                7.713030e+10 -42.10  3212.86  11861406.55        0.24
## D_OhlsonX4                2.095000e+02   1.44   441.67         0.05        0.58
## D_OhlsonX6                5.543999e+10  68.34  4718.98  11522586.07        1.52
## D_OhlsonX7                2.234244e+11  40.16  1922.29  47993612.34        1.18
## D_OhlsonX9                2.432069e+09  55.93  3378.02    480639.15        2.16
## NegLiab.y.1.              1.000000e+00   4.73    20.37         0.00        0.00
## NegLiab.y.2.              1.000000e+00   4.67    19.85         0.00        0.00
##                                 Q0.25       Q0.75
## Bankrupt                         0.00        1.00
## Year                          2012.00     2018.00
## AR_by_OpIncome                   0.60        4.52
## FB_Plus_OpInc_ByFB               0.78        1.21
## PercentMedicaidDays              0.04        0.13
## PercentMedicareDays              0.25        0.38
## CurrentRatio                     0.56        2.19
## Debt2Equity                     -0.41        0.80
## DaysSalesOutstanding            41.04       60.99
## LaborCompRatio                   0.37        0.57
## OpProfitMargin                  -0.16        0.03
## DaysCashOnHand                   0.45       33.29
## BedUtil                          0.29        0.57
## AdjPxDays                        2.44        7.26
## Alt1Ohls3                       -0.17        0.23
## AltmanX2                        -0.11        0.06
## AltmanX3                        -0.12        0.09
## AltmanX4                        -0.12        0.26
## OhlsonX1                        10.68       12.27
## OhlsonX2                         0.32        1.00
## OhlsonX4                         0.37        1.56
## OhlsonX6                        -0.08        0.07
## OhlsonX7                        -0.12        0.42
## OhlsonX9                  -5246276.50  6254823.75
## 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.              0.53        4.52
## FB_Plus_OpInc_ByFB.y.1.          0.71        1.19
## PercentMedicaidDays.y.1.         0.04        0.13
## PercentMedicareDays.y.1.         0.25        0.38
## CurrentRatio.y.1.                0.75        2.40
## Debt2Equity.y.1.                 0.00        1.19
## DaysSalesOutstanding.y.1.       41.88       63.19
## LaborCompRatio.y.1.              0.38        0.58
## OpProfitMargin.y.1.             -0.15        0.02
## DaysCashOnHand.y.1.              0.78       39.73
## BedUtil.y.1.                     0.29        0.59
## AdjPxDays.y.1.                   2.60        7.58
## Alt1Ohls3.y.1.                  -0.05        0.24
## AltmanX2.y.1.                   -0.11        0.06
## AltmanX3.y.1.                   -0.12        0.08
## AltmanX4.y.1.                   -0.13        0.18
## OhlsonX1.y.1.                   10.73       12.27
## OhlsonX2.y.1.                    0.33        0.94
## OhlsonX4.y.1.                    0.35        1.14
## OhlsonX6.y.1.                   -0.09        0.07
## OhlsonX7.y.1.                   -0.13        0.28
## OhlsonX9.y.1.             -4413218.50  6019103.25
## 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.              0.95        4.58
## FB_Plus_OpInc_ByFB.y.2.          0.77        1.16
## PercentMedicaidDays.y.2.         0.04        0.13
## PercentMedicareDays.y.2.         0.25        0.38
## CurrentRatio.y.2.                0.95        2.60
## Debt2Equity.y.2.                 0.03        1.30
## DaysSalesOutstanding.y.2.       42.97       63.17
## LaborCompRatio.y.2.              0.36        0.55
## OpProfitMargin.y.2.             -0.12        0.03
## DaysCashOnHand.y.2.              0.87       39.51
## BedUtil.y.2.                     0.30        0.59
## AdjPxDays.y.2.                   2.60        7.75
## Alt1Ohls3.y.2.                   0.01        0.23
## AltmanX2.y.2.                   -0.06        0.12
## AltmanX3.y.2.                   -0.07        0.09
## AltmanX4.y.2.                   -0.07        0.41
## OhlsonX1.y.2.                   10.73       12.24
## OhlsonX2.y.2.                    0.33        0.88
## OhlsonX4.y.2.                    0.34        0.98
## OhlsonX6.y.2.                   -0.05        0.08
## OhlsonX7.y.2.                   -0.11        0.22
## OhlsonX9.y.2.             -3110992.44 11135010.59
## OhlsonX5.y.2.                    0.00        0.00
## OhlsonX8.y.2.                    0.00        1.00
## D_AR_by_OpIncome                -0.32        2.43
## D_FB_Plus_OpInc_ByFB            -0.63        0.03
## D_CurrentRatio                  -0.34        0.07
## D_Debt2Equity                   -0.36        0.26
## D_LiabFundBalRatio              -0.41        0.21
## D_DaysSalesOutstanding          -0.11        0.11
## D_LaborCompRatio                -0.05        0.05
## D_OpProfitMargin                -0.62        0.50
## D_DaysCashOnHand                -0.52        0.44
## D_BedUtil                       -0.08        0.06
## D_AdjPxDays                     -0.06        0.05
## D_Alt1Ohls3                     -0.38        0.53
## D_AltmanX2                      -1.67        0.40
## D_AltmanX3                      -0.84        0.30
## D_AltmanX4                      -2.00        0.33
## D_OhlsonX1                      -0.01        0.00
## D_OhlsonX2                      -0.07        0.17
## D_OhlsonX4                      -0.09        0.49
## D_OhlsonX6                      -1.21        0.32
## D_OhlsonX7                      -0.86        0.33
## D_OhlsonX9                      -1.89        0.28
## NegLiab.y.1.                     0.00        0.00
## NegLiab.y.2.                     0.00        0.00
describe(train5, IQR = TRUE, quant = c(.25, .75))
##                           vars    n          mean           sd      median
## Bankrupt                     1 5446          0.50 5.000000e-01        0.50
## Year                         2 5446       2014.74 3.440000e+00     2015.00
## AR_by_OpIncome               3 5446          2.79 2.390000e+00        2.30
## FB_Plus_OpInc_ByFB           4 5446          6.34 4.773000e+01        1.07
## PercentMedicaidDays          5 5446          0.10 1.000000e-01        0.06
## PercentMedicareDays          6 5446          0.32 1.100000e-01        0.30
## CurrentRatio                 7 5446          3.32 9.719000e+01        1.40
## Debt2Equity                  8 5446        -14.26 1.318000e+02        0.12
## DaysSalesOutstanding         9 5446         60.94 9.916000e+01       51.71
## LaborCompRatio              10 5446          0.53 3.900000e-01        0.49
## OpProfitMargin              11 5446         -0.18 6.900000e-01       -0.09
## DaysCashOnHand              12 5446         33.26 1.007700e+02       13.07
## BedUtil                     13 5446          0.42 1.900000e-01        0.39
## AdjPxDays                   14 5446          6.12 7.800000e+00        3.73
## Alt1Ohls3                   15 5446  -11225853.34 4.581086e+08        0.10
## AltmanX2                    16 5446   -8944279.34 4.086746e+08       -0.04
## AltmanX3                    17 5446   -2100369.00 9.413172e+07       -0.03
## AltmanX4                    18 5446  181113755.97 3.332954e+09       -0.03
## OhlsonX1                    19 5446         11.37 1.800000e+00       11.20
## OhlsonX2                    20 5446   -6378524.05 5.585809e+08        0.66
## OhlsonX4                    21 5446          0.80 9.160000e+00        0.64
## OhlsonX6                    22 5446   -3431195.64 1.705792e+08       -0.02
## OhlsonX7                    23 5446  196616235.08 1.905941e+09       -0.01
## OhlsonX9                    24 5446    3994223.04 9.328534e+07 -1465466.37
## OhlsonX5                    25 5446          0.17 3.700000e-01        0.00
## OhlsonX8                    26 5446          0.46 5.000000e-01        0.00
## Govt                        27 5446          0.08 2.700000e-01        0.00
## Urban                       28 5446          0.06 2.400000e-01        0.00
## ForProfit                   29 5446          0.25 4.400000e-01        0.00
## HC1                         30 5446          0.03 1.800000e-01        0.00
## HC2                         31 5446          0.14 3.400000e-01        0.00
## HC4                         32 5446          0.13 3.400000e-01        0.00
## HC5                         33 5446          0.06 2.500000e-01        0.00
## AR_by_OpIncome.y.1.         34 5446          2.69 2.410000e+00        2.00
## FB_Plus_OpInc_ByFB.y.1.     35 5446          1.35 1.241000e+01        1.04
## PercentMedicaidDays.y.1.    36 5446          0.10 1.000000e-01        0.06
## PercentMedicareDays.y.1.    37 5446          0.32 1.100000e-01        0.30
## CurrentRatio.y.1.           38 5446          0.70 2.874000e+01        1.34
## Debt2Equity.y.1.            39 5446          0.98 4.664000e+01        0.28
## DaysSalesOutstanding.y.1.   40 5446         63.24 9.023000e+01       52.45
## LaborCompRatio.y.1.         41 5446          0.48 1.400000e-01        0.47
## OpProfitMargin.y.1.         42 5446         -0.08 2.300000e-01       -0.07
## DaysCashOnHand.y.1.         43 5446         32.69 9.456000e+01       11.27
## BedUtil.y.1.                44 5446          0.44 1.900000e-01        0.42
## AdjPxDays.y.1.              45 5446          6.10 7.590000e+00        3.79
## Alt1Ohls3.y.1.              46 5446   -7829668.26 2.666361e+08        0.08
## AltmanX2.y.1.               47 5446   -3206237.94 1.913856e+08       -0.03
## AltmanX3.y.1.               48 5446    -253652.93 1.766480e+07        0.02
## AltmanX4.y.1.               49 5446   56995641.96 1.542491e+09       -0.03
## OhlsonX1.y.1.               50 5446         11.34 1.660000e+00       11.24
## OhlsonX2.y.1.               51 5446    2203232.67 7.655909e+07        0.64
## OhlsonX4.y.1.               52 5446          0.92 3.680000e+00        0.68
## OhlsonX6.y.1.               53 5446    -410338.13 1.819539e+07       -0.01
## OhlsonX7.y.1.               54 5446  208887272.51 1.278488e+09        0.04
## OhlsonX9.y.1.               55 5446    2732786.84 9.732656e+07  -779875.65
## OhlsonX5.y.1.               56 5446          0.19 3.900000e-01        0.00
## OhlsonX8.y.1.               57 5446          0.39 4.900000e-01        0.00
## HC4_5.y.1.                  58 5446          0.20 4.000000e-01        0.00
## AR_by_OpIncome.y.2.         59 5446          2.80 2.450000e+00        2.28
## FB_Plus_OpInc_ByFB.y.2.     60 5446          0.06 1.026000e+01        0.96
## PercentMedicaidDays.y.2.    61 5446          0.10 1.000000e-01        0.06
## PercentMedicareDays.y.2.    62 5446          0.32 1.100000e-01        0.30
## CurrentRatio.y.2.           63 5446          2.97 6.027000e+01        1.46
## Debt2Equity.y.2.            64 5446          1.46 5.942000e+01        0.34
## DaysSalesOutstanding.y.2.   65 5446         59.02 7.045000e+01       52.77
## LaborCompRatio.y.2.         66 5446          0.50 1.900000e-01        0.47
## OpProfitMargin.y.2.         67 5446         -0.13 3.400000e-01       -0.05
## DaysCashOnHand.y.2.         68 5446         30.62 8.745000e+01        9.41
## BedUtil.y.2.                69 5446          0.42 1.900000e-01        0.40
## AdjPxDays.y.2.              70 5446          6.11 7.500000e+00        3.90
## Alt1Ohls3.y.2.              71 5446  -36454471.64 4.445196e+08        0.08
## AltmanX2.y.2.               72 5446  -26261121.56 1.018836e+09        0.01
## AltmanX3.y.2.               73 5446  -13076700.68 1.925851e+08        0.01
## AltmanX4.y.2.               74 5446   97010138.36 3.057117e+09        0.03
## OhlsonX1.y.2.               75 5446         11.20 2.160000e+00       11.27
## OhlsonX2.y.2.               76 5446   30635633.53 3.606421e+08        0.62
## OhlsonX4.y.2.               77 5446          8.62 9.252000e+01        0.67
## OhlsonX6.y.2.               78 5446   -7643256.14 3.066191e+08        0.01
## OhlsonX7.y.2.               79 5446  192015678.40 1.308031e+09        0.02
## OhlsonX9.y.2.               80 5446    7749707.06 1.250984e+08   792813.85
## OhlsonX5.y.2.               81 5446          0.18 3.800000e-01        0.00
## OhlsonX8.y.2.               82 5446          0.28 4.500000e-01        0.00
## D_AR_by_OpIncome            83 5446          2.90 1.902000e+01        0.01
## D_FB_Plus_OpInc_ByFB        84 5446          3.83 4.527000e+01       -0.05
## D_CurrentRatio              85 5446          0.14 2.580000e+00       -0.04
## D_Debt2Equity               86 5446         -4.13 5.262000e+01        0.00
## D_LiabFundBalRatio          87 5446         -5.59 5.298000e+01       -0.07
## D_DaysSalesOutstanding      88 5446         -0.66 6.262000e+01       -0.03
## D_LaborCompRatio            89 5446          0.09 4.300000e-01        0.02
## D_OpProfitMargin            90 5446          0.27 3.180000e+00        0.02
## D_DaysCashOnHand            91 5446         36.68 3.583400e+02        0.00
## D_BedUtil                   92 5446          0.01 8.000000e-01       -0.02
## D_AdjPxDays                 93 5446         10.81 7.947900e+02       -0.01
## D_Alt1Ohls3                 94 5446  -17292481.60 1.228662e+09       -0.12
## D_AltmanX2                  95 5446   18229704.57 1.033058e+09       -0.33
## D_AltmanX3                  96 5446   13693815.55 6.218078e+08       -0.25
## D_AltmanX4                  97 5446 -641871667.61 3.990834e+10       -0.42
## D_OhlsonX1                  98 5446          0.00 1.100000e-01        0.00
## D_OhlsonX2                  99 5446   -1067622.60 8.082479e+08        0.07
## D_OhlsonX4                 100 5446          0.49 3.950000e+00        0.07
## D_OhlsonX6                 101 5446   14266484.64 7.638004e+08        0.00
## D_OhlsonX7                 102 5446   79473488.76 3.139327e+09       -0.29
## D_OhlsonX9                 103 5446     498166.15 3.152300e+07       -0.30
## NegLiab.y.1.               104 5446          0.04 1.900000e-01        0.00
## NegLiab.y.2.               105 5446          0.04 2.000000e-01        0.00
##                              trimmed        mad           min          max
## Bankrupt                        0.50       0.74  0.000000e+00 1.000000e+00
## Year                         2014.72       4.45  2.008000e+03 2.021000e+03
## AR_by_OpIncome                  2.53       2.88  0.000000e+00 8.590000e+00
## FB_Plus_OpInc_ByFB              1.20       0.43 -4.289000e+01 6.986900e+02
## PercentMedicaidDays             0.08       0.04  0.000000e+00 9.800000e-01
## PercentMedicareDays             0.31       0.10  0.000000e+00 8.700000e-01
## CurrentRatio                    1.49       1.14 -4.645900e+02 7.098050e+03
## Debt2Equity                    -0.13       1.12 -1.922500e+03 4.077900e+02
## DaysSalesOutstanding           53.88      15.83 -1.972370e+03 4.282780e+03
## LaborCompRatio                  0.49       0.15  1.000000e-02 6.340000e+00
## OpProfitMargin                 -0.10       0.16 -1.046000e+01 8.000000e-01
## DaysCashOnHand                 18.32      19.13 -7.541700e+02 3.060150e+03
## BedUtil                         0.41       0.21  0.000000e+00 1.000000e+00
## AdjPxDays                       4.51       3.10  0.000000e+00 1.258200e+02
## Alt1Ohls3                       0.09       0.25 -2.069512e+10 1.716643e+10
## AltmanX2                       -0.06       0.16 -2.401988e+10 2.003558e+09
## AltmanX3                       -0.05       0.17 -6.057755e+09 1.405591e+09
## AltmanX4                   807656.06       0.27 -1.500000e+11 1.520000e+11
## OhlsonX1                       11.33       1.31 -1.115000e+01 1.724000e+01
## OhlsonX2                        0.73       0.56 -3.619138e+10 4.035141e+09
## OhlsonX4                        0.79       0.55 -6.426000e+02 8.697000e+01
## OhlsonX6                       -0.04       0.15 -1.187764e+10 2.003558e+09
## OhlsonX7                  1074044.25       0.29 -1.000000e+11 2.906021e+10
## OhlsonX9                   432502.10 7834533.05 -1.778187e+09 2.986955e+09
## OhlsonX5                        0.08       0.00  0.000000e+00 1.000000e+00
## OhlsonX8                        0.45       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.19       0.00  0.000000e+00 1.000000e+00
## HC1                             0.00       0.00  0.000000e+00 1.000000e+00
## HC2                             0.05       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.             2.42       2.68  0.000000e+00 8.600000e+00
## FB_Plus_OpInc_ByFB.y.1.         1.06       0.35 -2.297900e+02 6.417900e+02
## PercentMedicaidDays.y.1.        0.08       0.04  0.000000e+00 9.800000e-01
## PercentMedicareDays.y.1.        0.31       0.10  0.000000e+00 8.700000e-01
## CurrentRatio.y.1.               1.48       1.21 -7.873100e+02 1.482250e+03
## Debt2Equity.y.1.                0.37       0.74 -6.275700e+02 2.403630e+03
## DaysSalesOutstanding.y.1.      57.05      16.29 -1.647780e+03 3.816810e+03
## LaborCompRatio.y.1.             0.47       0.13 -4.900000e-01 1.970000e+00
## OpProfitMargin.y.1.            -0.07       0.12 -6.890000e+00 3.420000e+00
## DaysCashOnHand.y.1.            17.98      16.68 -1.292660e+03 2.814090e+03
## BedUtil.y.1.                    0.43       0.21  0.000000e+00 1.000000e+00
## AdjPxDays.y.1.                  4.58       3.30  0.000000e+00 1.415600e+02
## Alt1Ohls3.y.1.                  0.03       0.26 -1.295576e+10 3.015305e+08
## AltmanX2.y.1.                  -0.05       0.14 -1.398103e+10 2.097515e+08
## AltmanX3.y.1.                   0.03       0.15 -8.067078e+08 5.250694e+08
## AltmanX4.y.1.                   0.15       0.23 -1.602656e+10 2.825674e+10
## OhlsonX1.y.1.                  11.31       1.38 -1.115000e+01 1.712000e+01
## OhlsonX2.y.1.                   0.69       0.49 -2.483980e+07 3.917888e+09
## OhlsonX4.y.1.                   0.84       0.60 -1.835000e+02 7.136000e+01
## OhlsonX6.y.1.                  -0.02       0.13 -9.996727e+08 2.097517e+08
## OhlsonX7.y.1.                   0.26       0.27 -2.396372e+10 2.558153e+10
## OhlsonX9.y.1.              692478.05 6815197.15 -1.308272e+09 5.228494e+09
## OhlsonX5.y.1.                   0.11       0.00  0.000000e+00 1.000000e+00
## OhlsonX8.y.1.                   0.37       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.             2.55       3.03  1.000000e-02 8.600000e+00
## FB_Plus_OpInc_ByFB.y.2.         0.93       0.25 -3.264500e+02 4.451800e+02
## PercentMedicaidDays.y.2.        0.08       0.04  0.000000e+00 9.800000e-01
## PercentMedicareDays.y.2.        0.31       0.10  0.000000e+00 8.700000e-01
## CurrentRatio.y.2.               1.63       1.20 -9.944000e+01 4.418520e+03
## Debt2Equity.y.2.                0.56       0.55 -3.255210e+03 4.554200e+02
## DaysSalesOutstanding.y.2.      54.84      15.49 -1.931850e+03 2.455250e+03
## LaborCompRatio.y.2.             0.48       0.15 -1.990000e+00 4.580000e+00
## OpProfitMargin.y.2.            -0.08       0.13 -9.570000e+00 8.190000e+00
## DaysCashOnHand.y.2.            17.55      14.75 -1.576700e+03 2.385800e+03
## BedUtil.y.2.                    0.42       0.22  0.000000e+00 1.000000e+00
## AdjPxDays.y.2.                  4.63       3.42  0.000000e+00 1.372600e+02
## Alt1Ohls3.y.2.                  0.02       0.24 -1.303108e+10 1.546664e+09
## AltmanX2.y.2.                   0.01       0.10 -5.695970e+10 1.100960e+09
## AltmanX3.y.2.                  -0.07       0.14 -3.464660e+09 4.765823e+09
## AltmanX4.y.2.                   0.12       0.17 -1.540000e+11 1.140000e+11
## OhlsonX1.y.2.                  11.30       1.39 -1.115000e+01 1.700000e+01
## OhlsonX2.y.2.                   0.64       0.43 -6.485320e+07 6.737484e+09
## OhlsonX4.y.2.                   0.83       0.56 -9.859000e+01 1.675990e+03
## OhlsonX6.y.2.                  -0.05       0.12 -2.700965e+09 1.998557e+10
## OhlsonX7.y.2.                   0.04       0.27 -2.319753e+10 3.100398e+10
## OhlsonX9.y.2.             2894356.63 7298010.68 -1.539479e+09 5.228494e+09
## OhlsonX5.y.2.                   0.10       0.00  0.000000e+00 1.000000e+00
## OhlsonX8.y.2.                   0.23       0.00  0.000000e+00 1.000000e+00
## D_AR_by_OpIncome                0.85       0.81 -1.000000e+00 1.245000e+03
## D_FB_Plus_OpInc_ByFB           -0.18       0.31 -9.690000e+02 6.228300e+02
## D_CurrentRatio                  0.09       0.40 -1.220000e+02 2.300000e+01
## D_Debt2Equity                   0.11       0.66 -7.519800e+02 3.553800e+02
## D_LiabFundBalRatio             -0.12       0.42 -7.742200e+02 1.197100e+02
## D_DaysSalesOutstanding         -0.02       0.20 -4.557000e+03 5.583800e+02
## D_LaborCompRatio                0.04       0.09 -5.670000e+00 1.500000e+01
## D_OpProfitMargin                0.22       0.95 -1.010000e+02 7.800000e+01
## D_DaysCashOnHand                0.28       0.75 -1.522800e+04 1.694500e+04
## D_BedUtil                      -0.03       0.11 -1.000000e+00 5.300000e+01
## D_AdjPxDays                    -0.01       0.10 -9.500000e-01 5.865316e+04
## D_Alt1Ohls3                    -0.21       0.66 -8.997879e+10 3.052270e+09
## D_AltmanX2                     -0.39       1.24 -1.708382e+08 7.506213e+10
## D_AltmanX3                     -0.50       0.96 -1.539000e+03 3.406117e+10
## D_AltmanX4                     -0.57       1.26 -2.750000e+12 4.500000e+11
## D_OhlsonX1                      0.00       0.01 -2.310000e+00 1.310000e+00
## D_OhlsonX2                      0.08       0.19 -5.097377e+10 2.615652e+10
## D_OhlsonX4                      0.09       0.42 -1.045000e+02 1.050000e+02
## D_OhlsonX6                      0.04       1.18 -8.772930e+03 5.543998e+10
## D_OhlsonX7                     -0.48       0.99 -5.342444e+10 1.700000e+11
## D_OhlsonX9                     -0.38       1.42 -3.247753e+08 2.107294e+09
## NegLiab.y.1.                    0.00       0.00  0.000000e+00 1.000000e+00
## NegLiab.y.2.                    0.00       0.00  0.000000e+00 1.000000e+00
##                                  range   skew kurtosis           se         IQR
## Bankrupt                  1.000000e+00   0.00    -2.00         0.01        1.00
## Year                      1.300000e+01  -0.01    -0.90         0.05        5.00
## AR_by_OpIncome            8.590000e+00   0.67    -0.61         0.03        3.84
## FB_Plus_OpInc_ByFB        7.415800e+02  10.69   121.41         0.65        0.70
## PercentMedicaidDays       9.800000e-01   2.10     6.03         0.00        0.09
## PercentMedicareDays       8.700000e-01   0.63     1.13         0.00        0.13
## CurrentRatio              7.562640e+03  71.50  5211.99         1.32        1.57
## Debt2Equity               2.330290e+03 -10.61   120.46         1.79        1.59
## DaysSalesOutstanding      6.255150e+03  17.96   796.91         1.34       22.51
## LaborCompRatio            6.330000e+00  10.24   128.36         0.01        0.20
## OpProfitMargin            1.126000e+01 -10.41   129.09         0.01        0.21
## DaysCashOnHand            3.814320e+03  12.26   250.90         1.37       32.46
## BedUtil                   1.000000e+00   0.40    -0.71         0.00        0.30
## AdjPxDays                 1.258200e+02   4.04    27.07         0.11        4.86
## Alt1Ohls3                 3.786155e+10 -13.90  1255.02   6207683.98        0.34
## AltmanX2                  2.602344e+10 -51.91  2810.70   5537820.26        0.22
## AltmanX3                  7.463346e+09 -51.56  3212.60   1275549.08        0.24
## AltmanX4                  3.020000e+11   1.99  1568.64  45163799.26        0.39
## OhlsonX1                  2.839000e+01  -5.12    66.01         0.02        1.82
## OhlsonX2                  4.022652e+10 -56.33  3447.88   7569153.28        0.78
## OhlsonX4                  7.295700e+02 -63.34  4462.05         0.12        0.90
## OhlsonX6                  1.388120e+10 -62.47  4321.66   2311464.42        0.19
## OhlsonX7                  1.290602e+11 -23.85  1434.18  25826802.74        0.47
## OhlsonX9                  4.765142e+09   3.98   310.52   1264080.03 11764002.31
## OhlsonX5                  1.000000e+00   1.78     1.18         0.01        0.00
## OhlsonX8                  1.000000e+00   0.17    -1.97         0.01        1.00
## Govt                      1.000000e+00   3.15     7.89         0.00        0.00
## Urban                     1.000000e+00   3.75    12.08         0.00        0.00
## ForProfit                 1.000000e+00   1.13    -0.73         0.01        1.00
## HC1                       1.000000e+00   5.17    24.78         0.00        0.00
## HC2                       1.000000e+00   2.12     2.48         0.00        0.00
## HC4                       1.000000e+00   2.21     2.90         0.00        0.00
## HC5                       1.000000e+00   3.53    10.49         0.00        0.00
## AR_by_OpIncome.y.1.       8.600000e+00   0.68    -0.69         0.03        4.08
## FB_Plus_OpInc_ByFB.y.1.   8.715800e+02  32.49  1644.93         0.17        0.48
## PercentMedicaidDays.y.1.  9.800000e-01   2.10     6.03         0.00        0.09
## PercentMedicareDays.y.1.  8.700000e-01   0.63     1.13         0.00        0.13
## CurrentRatio.y.1.         2.269560e+03  22.56  1436.15         0.39        1.75
## Debt2Equity.y.1.          3.031200e+03  43.19  2192.42         0.63        0.99
## DaysSalesOutstanding.y.1. 5.464590e+03  18.06   766.04         1.22       25.58
## LaborCompRatio.y.1.       2.460000e+00   1.07     5.91         0.00        0.18
## OpProfitMargin.y.1.       1.031000e+01  -6.17   171.07         0.00        0.17
## DaysCashOnHand.y.1.       4.106750e+03   9.95   214.44         1.28       34.48
## BedUtil.y.1.              1.000000e+00   0.27    -0.67         0.00        0.29
## AdjPxDays.y.1.            1.415600e+02   4.28    34.74         0.10        5.06
## Alt1Ohls3.y.1.            1.325729e+10 -39.04  1629.75   3613101.68        0.39
## AltmanX2.y.1.             1.419078e+10 -71.67  5222.60   2593405.09        0.20
## AltmanX3.y.1.             1.331777e+09 -15.85  1183.71    239370.10        0.21
## AltmanX4.y.1.             4.428330e+10   1.41    92.32  20901806.01        0.34
## OhlsonX1.y.1.             2.827000e+01  -3.82    54.21         0.02        1.88
## OhlsonX2.y.1.             3.942728e+09  42.16  1908.75   1037427.99        0.68
## OhlsonX4.y.1.             2.548600e+02 -23.52  1250.68         0.05        0.98
## OhlsonX6.y.1.             1.209424e+09 -39.29  1900.90    246559.94        0.18
## OhlsonX7.y.1.             4.954525e+10   7.63   135.19  17324379.28        0.38
## OhlsonX9.y.1.             6.536766e+09  28.90  1564.20   1318841.32 10039133.25
## OhlsonX5.y.1.             1.000000e+00   1.58     0.48         0.01        0.00
## OhlsonX8.y.1.             1.000000e+00   0.44    -1.81         0.01        1.00
## HC4_5.y.1.                1.000000e+00   1.52     0.32         0.01        0.00
## AR_by_OpIncome.y.2.       8.600000e+00   0.63    -0.74         0.03        4.04
## FB_Plus_OpInc_ByFB.y.2.   7.716300e+02   6.17   873.39         0.14        0.35
## PercentMedicaidDays.y.2.  9.800000e-01   2.10     6.03         0.00        0.09
## PercentMedicareDays.y.2.  8.700000e-01   0.63     1.13         0.00        0.13
## CurrentRatio.y.2.         4.517960e+03  72.26  5288.85         0.82        1.76
## Debt2Equity.y.2.          3.710630e+03 -46.93  2417.49         0.81        1.00
## DaysSalesOutstanding.y.2. 4.387100e+03   8.11   551.63         0.95       22.40
## LaborCompRatio.y.2.       6.570000e+00   2.30    48.85         0.00        0.21
## OpProfitMargin.y.2.       1.776000e+01  -2.45   171.37         0.00        0.19
## DaysCashOnHand.y.2.       3.962500e+03   8.04   184.15         1.19       35.03
## BedUtil.y.2.              1.000000e+00   0.32    -0.75         0.00        0.30
## AdjPxDays.y.2.            1.372600e+02   4.18    33.28         0.10        5.26
## Alt1Ohls3.y.2.            1.457774e+10 -15.45   293.81   6023544.08        0.37
## AltmanX2.y.2.             5.806066e+10 -51.95  2736.24  13805921.56        0.13
## AltmanX3.y.2.             8.230483e+09  -8.59   230.68   2609659.90        0.23
## AltmanX4.y.2.             2.680000e+11 -15.64  1584.90  41426021.25        0.26
## OhlsonX1.y.2.             2.815000e+01  -4.96    45.70         0.03        1.88
## OhlsonX2.y.2.             6.802337e+09  13.47   193.65   4886946.41        0.58
## OhlsonX4.y.2.             1.774580e+03  13.15   184.65         1.25        0.94
## OhlsonX6.y.2.             2.268653e+10  49.50  3326.36   4154897.79        0.18
## OhlsonX7.y.2.             5.420151e+10   8.91   169.05  17724715.56        0.36
## OhlsonX9.y.2.             6.767973e+09  29.93  1194.04   1695169.01 10992258.55
## OhlsonX5.y.2.             1.000000e+00   1.69     0.86         0.01        0.00
## OhlsonX8.y.2.             1.000000e+00   0.95    -1.09         0.01        1.00
## D_AR_by_OpIncome          1.246000e+03  52.05  3343.57         0.26        1.80
## D_FB_Plus_OpInc_ByFB      1.591830e+03   7.29   135.95         0.61        0.48
## D_CurrentRatio            1.450000e+02 -27.15  1104.00         0.04        0.64
## D_Debt2Equity             1.107350e+03  -9.95   112.06         0.71        0.89
## D_LiabFundBalRatio        8.939400e+02 -10.68   121.46         0.72        0.59
## D_DaysSalesOutstanding    5.115380e+03 -70.70  5145.16         0.85        0.26
## D_LaborCompRatio          2.067000e+01  12.53   322.97         0.01        0.13
## D_OpProfitMargin          1.790000e+02  -5.80   319.64         0.04        1.44
## D_DaysCashOnHand          3.217300e+04   6.26  1520.26         4.86        1.05
## D_BedUtil                 5.400000e+01  54.17  3560.74         0.01        0.15
## D_AdjPxDays               5.865410e+04  73.76  5438.99        10.77        0.14
## D_Alt1Ohls3               9.303106e+10 -72.16  5275.06  16649215.32        0.92
## D_AltmanX2                7.523297e+10  70.70  5113.60  13998643.45        1.71
## D_AltmanX3                3.406117e+10  51.42  2680.11   8425920.86        1.46
## D_AltmanX4                3.200000e+12 -62.16  4192.02 540785265.26        1.73
## D_OhlsonX1                3.620000e+00 -16.04   310.83         0.00        0.02
## D_OhlsonX2                7.713030e+10 -38.36  3132.61  10952310.91        0.25
## D_OhlsonX4                2.095000e+02   3.43   238.50         0.05        0.56
## D_OhlsonX6                5.543999e+10  70.44  5091.15  10350016.58        1.60
## D_OhlsonX7                2.234244e+11  42.94  2187.60  42540024.32        1.47
## D_OhlsonX9                2.432069e+09  59.33  3801.75    427158.12        1.92
## NegLiab.y.1.              1.000000e+00   4.79    20.96         0.00        0.00
## NegLiab.y.2.              1.000000e+00   4.69    20.01         0.00        0.00
##                                 Q0.25      Q0.75
## Bankrupt                         0.00       1.00
## Year                          2012.00    2017.00
## AR_by_OpIncome                   0.64       4.48
## FB_Plus_OpInc_ByFB               0.87       1.57
## PercentMedicaidDays              0.04       0.13
## PercentMedicareDays              0.25       0.38
## CurrentRatio                     0.69       2.26
## Debt2Equity                     -0.99       0.60
## DaysSalesOutstanding            42.51      65.01
## LaborCompRatio                   0.39       0.59
## OpProfitMargin                  -0.20       0.01
## DaysCashOnHand                   1.29      33.75
## BedUtil                          0.26       0.56
## AdjPxDays                        1.93       6.79
## Alt1Ohls3                       -0.08       0.26
## AltmanX2                        -0.17       0.05
## AltmanX3                        -0.16       0.08
## AltmanX4                        -0.18       0.21
## OhlsonX1                        10.42      12.24
## OhlsonX2                         0.34       1.12
## OhlsonX4                         0.36       1.26
## OhlsonX6                        -0.13       0.06
## OhlsonX7                        -0.17       0.30
## OhlsonX9                  -5891622.94 5872379.37
## OhlsonX5                         0.00       0.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.              0.42       4.50
## FB_Plus_OpInc_ByFB.y.1.          0.82       1.30
## PercentMedicaidDays.y.1.         0.04       0.13
## PercentMedicareDays.y.1.         0.25       0.38
## CurrentRatio.y.1.                0.63       2.38
## Debt2Equity.y.1.                -0.10       0.89
## DaysSalesOutstanding.y.1.       43.61      69.18
## LaborCompRatio.y.1.              0.38       0.56
## OpProfitMargin.y.1.             -0.15       0.02
## DaysCashOnHand.y.1.              1.14      35.62
## BedUtil.y.1.                     0.29       0.58
## AdjPxDays.y.1.                   1.91       6.97
## Alt1Ohls3.y.1.                  -0.17       0.22
## AltmanX2.y.1.                   -0.14       0.06
## AltmanX3.y.1.                   -0.08       0.13
## AltmanX4.y.1.                   -0.17       0.17
## OhlsonX1.y.1.                   10.36      12.23
## OhlsonX2.y.1.                    0.35       1.03
## OhlsonX4.y.1.                    0.36       1.34
## OhlsonX6.y.1.                   -0.11       0.07
## OhlsonX7.y.1.                   -0.11       0.27
## OhlsonX9.y.1.             -4631504.25 5407629.00
## 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.              0.48       4.52
## FB_Plus_OpInc_ByFB.y.2.          0.75       1.10
## PercentMedicaidDays.y.2.         0.04       0.13
## PercentMedicareDays.y.2.         0.25       0.38
## CurrentRatio.y.2.                0.77       2.53
## Debt2Equity.y.2.                 0.05       1.05
## DaysSalesOutstanding.y.2.       44.00      66.40
## LaborCompRatio.y.2.              0.38       0.59
## OpProfitMargin.y.2.             -0.17       0.02
## DaysCashOnHand.y.2.              0.35      35.38
## BedUtil.y.2.                     0.27       0.57
## AdjPxDays.y.2.                   1.86       7.12
## Alt1Ohls3.y.2.                  -0.16       0.21
## AltmanX2.y.2.                   -0.05       0.08
## AltmanX3.y.2.                   -0.15       0.08
## AltmanX4.y.2.                   -0.05       0.21
## OhlsonX1.y.2.                   10.34      12.22
## OhlsonX2.y.2.                    0.35       0.93
## OhlsonX4.y.2.                    0.37       1.31
## OhlsonX6.y.2.                   -0.11       0.07
## OhlsonX7.y.2.                   -0.16       0.20
## OhlsonX9.y.2.             -2307225.30 8685033.25
## OhlsonX5.y.2.                    0.00       0.00
## OhlsonX8.y.2.                    0.00       1.00
## D_AR_by_OpIncome                -0.35       1.45
## D_FB_Plus_OpInc_ByFB            -0.42       0.06
## D_CurrentRatio                  -0.26       0.38
## D_Debt2Equity                   -0.39       0.50
## D_LiabFundBalRatio              -0.41       0.18
## D_DaysSalesOutstanding          -0.16       0.10
## D_LaborCompRatio                -0.03       0.09
## D_OpProfitMargin                -0.48       0.96
## D_DaysCashOnHand                -0.39       0.66
## D_BedUtil                       -0.11       0.05
## D_AdjPxDays                     -0.07       0.06
## D_Alt1Ohls3                     -0.71       0.21
## D_AltmanX2                      -1.25       0.46
## D_AltmanX3                      -1.24       0.22
## D_AltmanX4                      -1.40       0.33
## D_OhlsonX1                      -0.01       0.01
## D_OhlsonX2                      -0.05       0.20
## D_OhlsonX4                      -0.19       0.37
## D_OhlsonX6                      -0.79       0.81
## D_OhlsonX7                      -1.21       0.26
## D_OhlsonX9                      -1.32       0.60
## NegLiab.y.1.                     0.00       0.00
## NegLiab.y.2.                     0.00       0.00

Interim Write

#Write the data for interim use.

write.csv(train1, 'train1.csv', row.names = FALSE)
write.csv(test1,'test1.csv', row.names=FALSE)
write.csv(train2, 'train2.csv', row.names = FALSE)
write.csv(test2,'test2.csv', row.names=FALSE)
write.csv(train3, 'train3.csv', row.names = FALSE)
write.csv(test3,'test3.csv', row.names=FALSE)
write.csv(train4, 'train4.csv', row.names = FALSE)
write.csv(test4,'test4.csv', row.names=FALSE)
write.csv(train5, 'train5.csv', row.names = FALSE)
write.csv(test5,'test5.csv', row.names=FALSE)

Interim Read

#Read the data for interim use.
train1=read.csv('train1.csv')
test1=read.csv('test1.csv')

train2=read.csv('train2.csv')
test2=read.csv('test2.csv')

train3=read.csv('train3.csv')
test3=read.csv('test3.csv')

train4=read.csv('train4.csv')
test4=read.csv('test4.csv')

train5=read.csv('train5.csv')
test5=read.csv('test5.csv')

#Convert the Ohlson O1 variable to the proper measure.
train1$OhlsonX1.y.1.[train1$OhlsonX1.y.1.<0]=.1
train1$OhlsonX1.y.1.=log(train1$OhlsonX1.y.1.)
train2$OhlsonX1.y.1.[train2$OhlsonX1.y.1.<0]=.1
train2$OhlsonX1.y.1.=log(train2$OhlsonX1.y.1.)
train3$OhlsonX1.y.1.[train3$OhlsonX1.y.1.<0]=.1
train3$OhlsonX1.y.1.=log(train3$OhlsonX1.y.1.)
train4$OhlsonX1.y.1.[train4$OhlsonX1.y.1.<0]=.1
train4$OhlsonX1.y.1.=log(train4$OhlsonX1.y.1.)
train5$OhlsonX1.y.1.[train5$OhlsonX1.y.1.<0]=.1
train5$OhlsonX1.y.1.=log(train5$OhlsonX1.y.1.)
test1$OhlsonX1.y.1.[test1$OhlsonX1.y.1.<0]=.1
test1$OhlsonX1.y.1.=log(test1$OhlsonX1.y.1.)
test2$OhlsonX1.y.1.[test2$OhlsonX1.y.1.<0]=.1
test2$OhlsonX1.y.1.=log(test2$OhlsonX1.y.1.)
test3$OhlsonX1.y.1.[test3$OhlsonX1.y.1.<0]=.1
test3$OhlsonX1.y.1.=log(test3$OhlsonX1.y.1.)
test4$OhlsonX1.y.1.[test4$OhlsonX1.y.1.<0]=.1
test4$OhlsonX1.y.1.=log(test4$OhlsonX1.y.1.)
test5$OhlsonX1.y.1.[test5$OhlsonX1.y.1.<0]=.1
test5$OhlsonX1.y.1.=log(test5$OhlsonX1.y.1.)

Analytical Functions

Nagelkerke

# Function to calculate Nagelkerke's R-squared for a given model
myr2=function(mod) {
  NagelkerkeR2(mod)$R2
}

Confusion Matrix

For use when functions support it

# Function to create a confusion matrix for a given model and dataset

mycm <- function(mod, dat) {
  # Predict probabilities using the model on the given dataset
  mypred <- round(predict(mod, dat, type = 'response'), 3)
  # Convert probabilities to binary predictions using a threshold of 0.5
  mypred_binary <- ifelse(mypred < 0.5, 0, 1)
  
  # Create the confusion matrix
  cm <- confusionMatrix(as.factor(mypred_binary), as.factor(dat$Bankrupt), positive = '1', mode = "prec_recall")
  
  # Calculate AUC
  roc_obj <- roc(as.numeric(dat$Bankrupt), as.numeric(mypred))
  auc_value <- auc(roc_obj)
  
  # Calculate PR-AUC
  pr_obj <- pr.curve(scores.class0 = mypred, weights.class0 = as.numeric(dat$Bankrupt) == 1, curve = FALSE)
  pr_auc_value <- pr_obj$auc.integral
  
  cm$byClass=round(c(cm$byClass,AUC = auc_value, PR_AUC = pr_auc_value),3)

  return(cm)
}

Plot Confusion Matrix

# Function to convert confusion matrix to data frame for ggplot
confusion_matrix_to_df <- function(conf_matrix) {
  df <- as.data.frame(as.table(conf_matrix$table))
  df$Percentage <- df$Freq / rowSums(conf_matrix$table)[df$Reference] * 100
  df$Correct <- ifelse(df$Reference == df$Prediction, "Correct", "Incorrect")
  df$Majority <- ifelse(df$Percentage >= 50, "Majority", "Minority")
  df$Shade <- interaction(df$Correct, df$Majority)
  df$Reference <- factor(df$Reference, levels = rev(levels(df$Reference)))
  return(df)
}
shade_colors <- c("Correct.Majority" = "darkgreen",
                  "Correct.Minority" = "lightgreen",
                  "Incorrect.Majority" = "darkred",
                  "Incorrect.Minority" = "lightcoral")

plot_confusion_matrix <- function(df, title) {
  ggplot(df, aes(x = Prediction, y = Reference, fill = Shade)) +
    geom_tile() +
    geom_text(aes(label = Freq), color = "white", size = 5) +
    scale_fill_manual(values = shade_colors) +
    labs(title = title, x = "Predicted", y = "Actual") +
    theme_minimal() +
    theme(axis.text.x = element_text(angle = 45, hjust = 1),
          legend.position = "none")  # Remove the legend
}

Linearity Checks

# Function to check linearity of the logit for a given model and dataset
mylinearity <- function(mod, dat) {
  # Predict probabilities using the model on the given dataset
  mypred <- round(predict(mod, dat, type = 'response'), 3)
  # Avoid log(0) by adding a small epsilon to the predictions
  epsilon <- 1e-15
  mypred <- pmin(pmax(mypred, epsilon), 1 - epsilon)
  # Calculate logits (log-odds)
  logits <- log(mypred / (1 - mypred))
  # Select only numeric columns from the dataset for plotting
  forplot <- select_if(dat, is.numeric)
  # Loop through each numeric column and plot it against the logits
  for (i in 1:ncol(forplot)) {
    print(plot(forplot[, i] ~ logits, ylab = colnames(forplot)[i], col = 'blue'))
  }
}

Outlier checks

# Function to identify potential outliers in the model using leverage plot
myoutliers <- function(mod) {
  print(plot(mod, which = 4, id.n = 5))
}

GLM Fit

myGLMfit=function(train, test) {
  
  suppressWarnings({initial_model=glm(as.factor(Bankrupt)~.,data=train, family='binomial',control = glm.control(maxit = 10000))
  
  # Identify outliers with Cook's distance > 1
  cooks_d =cooks.distance(initial_model)
  outliers=which(cooks_d > 1)
  
  # Remove outliers from training data
   if (length(outliers) > 0) {
    outliers_to_remove <- outliers[train$Bankrupt[outliers] == 0]
    if (length(outliers_to_remove) > 0) {
      train <- train[-outliers_to_remove, ]
    }
  }
  
  # Refit the model without outliers
    final_model <- glm(as.factor(Bankrupt) ~ ., data = train, family = 'binomial', control = glm.control(maxit = 10000))

  
  cm =mycm(final_model, test)
  capture.output(mylinearity(final_model, train))
  capture.output(myoutliers(final_model))
  mypred=predict(final_model, test, type = "response")
  mycoefs=coefficients(final_model)
  
  # Plot PR curve if needed
  pr2 <- pr.curve(scores.class0 = mypred, weights.class0 = test$Bankrupt, curve = TRUE, 
                  max.compute = TRUE, min.compute = TRUE, rand.compute = TRUE)
  plot(pr2, max.plot = TRUE, min.plot = TRUE, rand.plot = TRUE, fill.area = TRUE, color = 'black', auc.main = TRUE)
  
  return(list(confusion_matrix = cm, mod=final_model, coefficients=mycoefs, outliers=outliers, predictions=mypred))
  })
}

GLM Summary

glm_summary <- function(glm_model) {
  # Extract coefficients
  coefficients <- coef(glm_model)
  
  # Extract standard errors with error handling
  std_errors <- tryCatch({
    sqrt(diag(vcov(glm_model)))
  }, error = function(e) {
    rep(NA, length(coefficients))
  })
  
  # Calculate log odds and odds ratios
  log_odds <- coefficients
  odds_ratios <- exp(coefficients)
  
  # Calculate VIF values with error handling
  vif_values <- tryCatch({
    vif(glm_model)
  }, error = function(e) {
    rep(NA, length(coefficients))
  })
  
  # Ensure VIF values have the same length as coefficients
  if (length(vif_values) != length(coefficients)) {
    vif_values <- rep(NA, length(coefficients))
  }
  
  # Create a summary data frame
  summary_df <- data.frame(
    Coefficients = coefficients,
    `Standard Errors` = std_errors,
    `Log Odds` = log_odds,
    `Odds Ratios` = odds_ratios,
    VIF = vif_values
  )
  
  # Calculate probabilities associated with log odds for the overall model
  probabilities <- predict(glm_model, type = "response")
  
  return(list(
    Summary = summary_df,
    Probabilities = probabilities
  ))
}

Perceptron (M4b)

# Custom function to fit a perceptron and perform various evaluations
myPerceptronFit <- function(train, test) {
  # Convert response variable to dummy variables
  train_dummy <- train
  test_dummy <- test
  train_dummy$Bankrupt <- as.numeric(as.factor(train$Bankrupt)) - 1
  test_dummy$Bankrupt <- as.numeric(as.factor(test$Bankrupt)) - 1
  
  myminmax <- function(x) (x - min(x, na.rm = TRUE)) / (max(x, na.rm = TRUE) - min(x, na.rm = TRUE))
  mynames <- colnames(train)
  
  # Normalize data for neural network
  train_norm <- as.data.frame(cbind(Bankrupt = train_dummy$Bankrupt, apply(train_dummy[, -1], 2, myminmax)))
  test_norm <- as.data.frame(cbind(Bankrupt = test_dummy$Bankrupt, apply(test_dummy[, -1], 2, myminmax)))
  colnames(train_norm) <- mynames
  colnames(test_norm) <- mynames
  
  # Prepare data for nnet
  x_train <- as.matrix(train_norm[, -1])
  y_train <- train_norm$Bankrupt
  x_test <- as.matrix(test_norm[, -1])
  y_test <- test_norm$Bankrupt
  
  # Fit the perceptron model using nnet
  set.seed(123)
  perceptron_model <- nnet(x_train, y_train, size = ncol(train) - 1, linout = FALSE, maxit = 20000, reltol=.001, trace=FALSE)
  
  # Generate predictions
  raw_predictions <- predict(perceptron_model, x_test, type = "raw")
  predictions <- ifelse(raw_predictions > 0.5, 1, 0)
  
  # Ensure predictions and actual values are factors with the same levels
  predictions <- factor(predictions, levels = c(0, 1))
  test_norm$Bankrupt <- factor(test_norm$Bankrupt, levels = c(0, 1))
  
  # Confusion matrix
  cm <- caret::confusionMatrix(predictions, test_norm$Bankrupt, positive='1',  mode = "prec_recall")
  
  # Calculate AUC and AUCpr
  auc <- roc(test_norm$Bankrupt, as.numeric(raw_predictions))$auc
  aucpr <- pr.curve(scores.class0 = raw_predictions, weights.class0 = y_test, curve = FALSE)$auc.integral
  
  # Add AUC, AUCpr, and F1 score to the confusion matrix results
  cm$byClass <- c(cm$byClass,AUC = auc, AUCpr = aucpr)
  
  # Extract weights and create a dataframe with variable names
  weights <- data.frame(variable = c("(Bias)", colnames(x_train)), weight = perceptron_model$wts[1:(ncol(x_train) + 1)])
  
  # Return results
  return(list(confusion_matrix = cm, model = perceptron_model, predictions = predictions, coefficients = weights))
}

SVM Function (M4c)

mySVMFit=function(train, test) {
  myminmax=function(x) {(x - min(x)) / (max(x) - min(x))}
  # Apply normalization only to numeric columns
  mynames=colnames(train)
  train=as.data.frame(apply(train,2, myminmax))
  test=as.data.frame(apply(test, 2, myminmax))
  colnames(train)=mynames
  colnames(test)=mynames
 

  # Fit the SVM model using kernlab with probability enabled
  set.seed(42)
  svm_model=ksvm(Bankrupt ~ ., data = train, scaled=FALSE,kernel = "vanilladot", type="C-svc", prob.model = TRUE)
  
   # Extract SVM weights
  weights=colSums(svm_model@xmatrix[[1]] * svm_model@coef[[1]])
  
  # Generate predictions with probabilities
  predictions <- predict(svm_model, test, type = "probabilities")
  predictions=round(predictions[,2],1)
  predicted_classes <- factor(predictions, levels = c('0','1'))
  y=factor(test$Bankrupt, levels = c('0','1'))

  # Confusion matrix
  cm <- confusionMatrix(predicted_classes, y, positive='1', mode = "prec_recall")
  
  # Calculate ROC AUC
  roc_curve <- roc.curve(test$Bankrupt, predictions, max.compute=TRUE)
  
  # Calculate PR AUC
  pr_curve <- pr.curve(scores.class0 = predictions, weights.class0 = as.numeric(test$Bankrupt) == 1)

  # Add AUC, PR_AUC, and F1 score to the confusion matrix results
  cm$byClass <- c(cm$byClass,AUC=roc_curve$auc, PR_AUC=pr_curve$auc.integral)
  
  # Return results
  return(list(model = svm_model,confusion_matrix=cm, probs=predictions, predicted=predicted_classes, roc=roc_curve, pr=pr_curve, coefficients=weights))
}

Unique Variable Tree Model (M4d)

# Function to find the best split based on Gini impurity
best_split_gini <- function(data, response_var, used_vars) {
  best_var <- NULL
  best_gini <- Inf
  best_split <- NULL

  response <- data[[response_var]]
  predictors <- setdiff(names(data), c(response_var, used_vars))

  for (var in predictors) {
    unique_values <- unique(data[[var]])
    
    for (val in unique_values) {
      left_split <- response[data[[var]] <= val]
      right_split <- response[data[[var]] > val]

      if (length(left_split) == 0 | length(right_split) == 0) {
        next
      }

      gini_left <- 1 - sum((table(left_split) / length(left_split))^2)
      gini_right <- 1 - sum((table(right_split) / length(right_split))^2)

      weighted_gini <- (length(left_split) / length(response)) * gini_left + 
                       (length(right_split) / length(response)) * gini_right

      if (!is.na(weighted_gini) & weighted_gini < best_gini) {
        best_gini <- weighted_gini
        best_var <- var
        best_split <- val
      }
    }
  }

  list(variable = best_var, split = best_split)
}

# Custom function to fit a decision tree model using unique variables for each split up to depth 5
fit_decision_tree <- function(train_set, test_set, response_var = "Bankrupt", max_depth = 10) {
  used_vars <- c()
  splits <- list()
  
  # Find the best splits for each level of the tree up to max_depth
  for (i in 1:max_depth) {
    split <- best_split_gini(train_set, response_var, used_vars)
    if (!is.null(split$variable)) {
      used_vars <- c(used_vars, split$variable)
      splits[[i]] <- split
      train_set[[split$variable]] <- ifelse(train_set[[split$variable]] <= split$split, 1, 0)
      test_set[[split$variable]] <- ifelse(test_set[[split$variable]] <= split$split, 1, 0)
    }
  }

  # Ensure all split columns are numeric
  for (i in 1:length(splits)) {
    train_set[[splits[[i]]$variable]] <- as.numeric(train_set[[splits[[i]]$variable]])
    test_set[[splits[[i]]$variable]] <- as.numeric(test_set[[splits[[i]]$variable]])
  }

  # Create the formula for the decision tree
  if (length(splits) > 0) {
    split_vars <- sapply(splits, function(x) x$variable)
    tree_formula <- as.formula(paste(response_var, "~", paste(split_vars, collapse = "+")))
  } else {
    stop("No valid splits found.")
  }

  # Build the decision tree using the unique split variables on the training set
  tree_model <- rpart(tree_formula, data = train_set, method = "class", control = rpart.control(maxdepth = max_depth, x=TRUE, y=TRUE))

  # Plot the decision tree with labeled variables
  rpart.plot(tree_model, main = "Decision Tree using Unique Splits", type = 4, extra = 106)
  
# Generate predictions with probabilities
  prediction_probs <- predict(tree_model, test_set, type = "prob")[,2]
  predictions <- ifelse(prediction_probs > 0.5, 1, 0)
  
  # Create a confusion matrix
  conf_matrix <- caret::confusionMatrix(as.factor(predictions), 
                                        as.factor(test_set[[response_var]]), positive = "1", 
                                        mode = "prec_recall")
  
  # Calculate ROC AUC
  roc_curve <- roc(test_set[[response_var]], prediction_probs)
  auc_value <- auc(roc_curve)
  
  # Calculate PR AUC
  pr_curve <- pr.curve(scores.class0 = prediction_probs, weights.class0 = as.numeric(test_set[[response_var]]) == 1)
  pr_auc_value <- pr_curve$auc.integral
  
  # Add AUC, PR_AUC, and F1 score to the confusion matrix results
  conf_matrix$byClass <- c(conf_matrix$byClass, AUC = auc_value, PR_AUC = pr_auc_value)
  
  # Print the tree structure
  print(tree_model)
  
  # Return results
  return(list(confusion_matrix = conf_matrix, model = tree_model, predictions = predictions, splits = splits))
}

Metrics

mymetrics=function(m1,m2,m3,m4,m5){
  mat=rbind(m1$byClass, m2$byClass,m3$byClass,m4$byClass,m5$byClass)
  colnames(mat)=names(m1$byClass)
  rownames(mat)=c('50%', '60%', '70%', '80%','90%')
  return(mat)
}

Coefficients

mycoefs=function(m1,m2,m3,m4,m5){
  mycoef=rbind(m1$coefficients,m2$coefficients,m3$coefficients,m4$coefficients, m5$coefficients)
  rownames(mycoef)=c('50%', '60%', '70%', '80%','90%')
  return(mycoef)
}

Outlier Length

outlength=function(m1,m2,m3,m4,m5,x1=0,x2=0,x3=0,x4=0,x5=0)
{
  cooks=c(length(m1$outliers)+x1, length(m2$outliers)+x2, length(m3)+x3, length(m4$outliers)+x4,length(m5$outliers)+x5)
}

Models

M1b: Altman Re-estimated

m1b_50=myGLMfit(train1[-c(164,315,403,858,906,1143, 1210,1517), c(1, 46:49)],test1[, c(1, 46:49)])
## Setting levels: control = 0, case = 1
## Setting direction: controls < cases

m1b_60=myGLMfit(train2[-c(533,768, 1659,1775), c(1, 46:49)],test2[, c(1, 46:49)])
## Setting levels: control = 0, case = 1
## Setting direction: controls < cases

m1b_70=myGLMfit(train3[, c(1, 46:49)],test3[, c(1, 46:49)])
## Setting levels: control = 0, case = 1
## Setting direction: controls < cases

m1b_80=myGLMfit(train4[, c(1, 46:49)],test4[, c(1, 46:49)])
## Setting levels: control = 0, case = 1
## Setting direction: controls < cases

m1b_90=myGLMfit(train5[, c(1, 46:49)],test5[, c(1, 46:49)])
## Setting levels: control = 0, case = 1
## Setting direction: controls < cases

cm1b_50 = m1b_50$confusion_matrix
cm1b_60 = m1b_60$confusion_matrix
cm1b_70 = m1b_70$confusion_matrix
cm1b_80 = m1b_80$confusion_matrix
cm1b_90 = m1b_90$confusion_matrix

mymat1b=mymetrics(cm1b_50,cm1b_60,cm1b_70,cm1b_80,cm1b_90)
myCoefmat1b=mycoefs(m1b_50,m1b_60,m1b_70,m1b_80, m1b_90)
cooks_outliersm1b=outlength(m1b_50, m1b_60, m1b_70, m1b_80,m1b_90,8,4,0,0,0)

temp=cbind(mymat1b[, c(11, 5,6,7, 2,4, 12,13)],myCoefmat1b)
temp=as.data.frame(t(temp))
temp
##                             50%           60%           70%           80%
## Balanced Accuracy  6.600000e-01  6.720000e-01  4.620000e-01  5.360000e-01
## Precision          5.400000e-02  5.100000e-02  2.000000e-02  2.300000e-02
## Recall             5.150000e-01  5.770000e-01  8.500000e-01  1.000000e+00
## F1                 9.800000e-02  9.300000e-02  3.900000e-02  4.400000e-02
## Specificity        8.040000e-01  7.670000e-01  7.400000e-02  7.300000e-02
## Neg Pred Value     9.870000e-01  9.880000e-01  9.570000e-01  1.000000e+00
## AUC                6.530000e-01  6.320000e-01  4.850000e-01  5.350000e-01
## PR_AUC             4.700000e-02  4.200000e-02  7.300000e-02  2.200000e-02
## (Intercept)       -2.164289e-01  4.820826e-02  2.616387e-02  3.065474e-02
## Alt1Ohls3.y.1.     1.318729e-02 -1.169410e+00  2.766673e-09  2.641375e-09
## AltmanX2.y.1.      9.557643e-02  6.129867e-02  5.459286e-10 -1.663568e-10
## AltmanX3.y.1.     -6.004583e+00 -1.282091e+00  2.977243e-08  2.947058e-08
## AltmanX4.y.1.     -3.393179e-10 -8.532309e-11 -8.573918e-10 -1.959453e-10
##                             90%
## Balanced Accuracy  4.650000e-01
## Precision          2.100000e-02
## Recall             8.570000e-01
## F1                 4.100000e-02
## Specificity        7.300000e-02
## Neg Pred Value     9.570000e-01
## AUC                5.270000e-01
## PR_AUC             1.720000e-01
## (Intercept)        3.105041e-02
## Alt1Ohls3.y.1.     5.274801e-09
## AltmanX2.y.1.     -2.670717e-10
## AltmanX3.y.1.      7.773699e-08
## AltmanX4.y.1.     -5.124893e-10

M1b Output

t1b=round(cbind(mymat1b[, c(11, 5,6,7, 2,4, 12,13)],myCoefmat1b),3)
myprint(t1b)
## <table class=" lightable-classic table" style='font-size: 16px; font-family: "Arial Narrow", "Source Sans Pro", sans-serif; width: auto !important; margin-left: auto; margin-right: auto; font-size: Cambria; margin-left: auto; margin-right: auto;'>
##  <thead>
##   <tr>
##    <th style="text-align:left;">   </th>
##    <th style="text-align:right;"> Balanced Accuracy </th>
##    <th style="text-align:right;"> Precision </th>
##    <th style="text-align:right;"> Recall </th>
##    <th style="text-align:right;"> F1 </th>
##    <th style="text-align:right;"> Specificity </th>
##    <th style="text-align:right;"> Neg Pred Value </th>
##    <th style="text-align:right;"> AUC </th>
##    <th style="text-align:right;"> PR_AUC </th>
##    <th style="text-align:right;"> (Intercept) </th>
##    <th style="text-align:right;"> Alt1Ohls3.y.1. </th>
##    <th style="text-align:right;"> AltmanX2.y.1. </th>
##    <th style="text-align:right;"> AltmanX3.y.1. </th>
##    <th style="text-align:right;"> AltmanX4.y.1. </th>
##   </tr>
##  </thead>
## <tbody>
##   <tr>
##    <td style="text-align:left;"> 50% </td>
##    <td style="text-align:right;"> 0.660 </td>
##    <td style="text-align:right;"> 0.054 </td>
##    <td style="text-align:right;"> 0.515 </td>
##    <td style="text-align:right;"> 0.098 </td>
##    <td style="text-align:right;"> 0.804 </td>
##    <td style="text-align:right;"> 0.987 </td>
##    <td style="text-align:right;"> 0.653 </td>
##    <td style="text-align:right;"> 0.047 </td>
##    <td style="text-align:right;"> -0.216 </td>
##    <td style="text-align:right;"> 0.013 </td>
##    <td style="text-align:right;"> 0.096 </td>
##    <td style="text-align:right;"> -6.005 </td>
##    <td style="text-align:right;"> 0 </td>
##   </tr>
##   <tr>
##    <td style="text-align:left;"> 60% </td>
##    <td style="text-align:right;"> 0.672 </td>
##    <td style="text-align:right;"> 0.051 </td>
##    <td style="text-align:right;"> 0.577 </td>
##    <td style="text-align:right;"> 0.093 </td>
##    <td style="text-align:right;"> 0.767 </td>
##    <td style="text-align:right;"> 0.988 </td>
##    <td style="text-align:right;"> 0.632 </td>
##    <td style="text-align:right;"> 0.042 </td>
##    <td style="text-align:right;"> 0.048 </td>
##    <td style="text-align:right;"> -1.169 </td>
##    <td style="text-align:right;"> 0.061 </td>
##    <td style="text-align:right;"> -1.282 </td>
##    <td style="text-align:right;"> 0 </td>
##   </tr>
##   <tr>
##    <td style="text-align:left;"> 70% </td>
##    <td style="text-align:right;"> 0.462 </td>
##    <td style="text-align:right;"> 0.020 </td>
##    <td style="text-align:right;"> 0.850 </td>
##    <td style="text-align:right;"> 0.039 </td>
##    <td style="text-align:right;"> 0.074 </td>
##    <td style="text-align:right;"> 0.957 </td>
##    <td style="text-align:right;"> 0.485 </td>
##    <td style="text-align:right;"> 0.073 </td>
##    <td style="text-align:right;"> 0.026 </td>
##    <td style="text-align:right;"> 0.000 </td>
##    <td style="text-align:right;"> 0.000 </td>
##    <td style="text-align:right;"> 0.000 </td>
##    <td style="text-align:right;"> 0 </td>
##   </tr>
##   <tr>
##    <td style="text-align:left;"> 80% </td>
##    <td style="text-align:right;"> 0.536 </td>
##    <td style="text-align:right;"> 0.023 </td>
##    <td style="text-align:right;"> 1.000 </td>
##    <td style="text-align:right;"> 0.044 </td>
##    <td style="text-align:right;"> 0.073 </td>
##    <td style="text-align:right;"> 1.000 </td>
##    <td style="text-align:right;"> 0.535 </td>
##    <td style="text-align:right;"> 0.022 </td>
##    <td style="text-align:right;"> 0.031 </td>
##    <td style="text-align:right;"> 0.000 </td>
##    <td style="text-align:right;"> 0.000 </td>
##    <td style="text-align:right;"> 0.000 </td>
##    <td style="text-align:right;"> 0 </td>
##   </tr>
##   <tr>
##    <td style="text-align:left;"> 90% </td>
##    <td style="text-align:right;"> 0.465 </td>
##    <td style="text-align:right;"> 0.021 </td>
##    <td style="text-align:right;"> 0.857 </td>
##    <td style="text-align:right;"> 0.041 </td>
##    <td style="text-align:right;"> 0.073 </td>
##    <td style="text-align:right;"> 0.957 </td>
##    <td style="text-align:right;"> 0.527 </td>
##    <td style="text-align:right;"> 0.172 </td>
##    <td style="text-align:right;"> 0.031 </td>
##    <td style="text-align:right;"> 0.000 </td>
##    <td style="text-align:right;"> 0.000 </td>
##    <td style="text-align:right;"> 0.000 </td>
##    <td style="text-align:right;"> 0 </td>
##   </tr>
## </tbody>
## </table>
df1 <- confusion_matrix_to_df(cm1b_50)
df2 <- confusion_matrix_to_df(cm1b_60)
df3 <- confusion_matrix_to_df(cm1b_70)
df4 <- confusion_matrix_to_df(cm1b_80)
df5 <- confusion_matrix_to_df(cm1b_90)

# Create individual plots
M1bplot1 <- plot_confusion_matrix(df1, "M1b 50%")
M1bplot2 <- plot_confusion_matrix(df2, "M1b 60%")
M1bplot3 <- plot_confusion_matrix(df3, "M1b 70%")
M1bplot4 <- plot_confusion_matrix(df4, "M1b 80%")
M1bplot5 <- plot_confusion_matrix(df5, "M1b 90%")


# Arrange the plots side by side
grid.arrange(M1bplot1, M1bplot2, M1bplot3, M1bplot4, M1bplot5, ncol = 3)

M1a: Altman Original

myalt <- function(test) {
  test$Z <- 6.72 * test$Alt1Ohls3.y.1. +
            1.05 * test$AltmanX2.y.1. +
            6.5 * test$AltmanX3.y.1. +
            3.26 * test$AltmanX4.y.1.
  
  # Calculate Decision Rule
  test$Decision <- ifelse(test$Z < 1.1, 1, 0)
  
  # Ensure factors have the same levels
  test$Decision <- factor(test$Decision, levels = c(0, 1))
  test$Bankrupt <- factor(test$Bankrupt, levels = c(0, 1))
  
  # Confusion Matrix
  cm <- caret::confusionMatrix(as.factor(test$Decision), as.factor(test$Bankrupt), positive = "1", mode = "prec_recall")
  
  # Calculate ROC AUC
  roc_curve <- roc(test$Bankrupt, test$Z)
  auc_value <- auc(roc_curve)
  
  # Calculate PR AUC
  fg <- test$Z[test$Bankrupt == 1]
  bg <- test$Z[test$Bankrupt == 0]
  pr_curve <- pr.curve(scores.class0 = fg, scores.class1 = bg, curve = TRUE)
  pr_auc_value <- pr_curve$auc.integral
  
  # Add AUC and PR AUC to the confusion matrix results
  cm$byClass <- c(cm$byClass, AUC = auc_value, PR_AUC = pr_auc_value)
  
  return(cm)
}

print(colnames(test1[, c(1, 46:49)]))
## [1] "Bankrupt"       "Alt1Ohls3.y.1." "AltmanX2.y.1."  "AltmanX3.y.1." 
## [5] "AltmanX4.y.1."
cm1a_50 <- myalt(test1[-m1b_50$outliers, c(1, 46:49)])
## Setting levels: control = 0, case = 1
## Setting direction: controls > cases
cm1a_60 <- myalt(test2[-m1b_60$outliers, c(1, 46:49)])
## Setting levels: control = 0, case = 1
## Setting direction: controls > cases
cm1a_70 <- myalt(test3[-m1b_70$outliers, c(1, 46:49)])
## Setting levels: control = 0, case = 1
## Setting direction: controls > cases
cm1a_80 <- myalt(test4[, c(1, 46:49)]) # no outliers!
## Setting levels: control = 0, case = 1
## Setting direction: controls > cases
cm1a_90 <- myalt(test5[, c(1, 46:49)])
## Setting levels: control = 0, case = 1
## Setting direction: controls > cases
mymat1a <- rbind(cm1a_50$byClass, cm1a_60$byClass, cm1a_70$byClass, cm1a_80$byClass, cm1a_90$byClass)
mymat1a <- round(mymat1a, 3)
rownames(mymat1a) <- c('50%', '60%', '70%', '80%', '90%')

M1a Output

myprint(mymat1a[, c(11, 5,6,7, 2,4, 12,13)])
## <table class=" lightable-classic table" style='font-size: 16px; font-family: "Arial Narrow", "Source Sans Pro", sans-serif; width: auto !important; margin-left: auto; margin-right: auto; font-size: Cambria; margin-left: auto; margin-right: auto;'>
##  <thead>
##   <tr>
##    <th style="text-align:left;">   </th>
##    <th style="text-align:right;"> Balanced Accuracy </th>
##    <th style="text-align:right;"> Precision </th>
##    <th style="text-align:right;"> Recall </th>
##    <th style="text-align:right;"> F1 </th>
##    <th style="text-align:right;"> Specificity </th>
##    <th style="text-align:right;"> Neg Pred Value </th>
##    <th style="text-align:right;"> AUC </th>
##    <th style="text-align:right;"> PR_AUC </th>
##   </tr>
##  </thead>
## <tbody>
##   <tr>
##    <td style="text-align:left;"> 50% </td>
##    <td style="text-align:right;"> 0.633 </td>
##    <td style="text-align:right;"> 0.035 </td>
##    <td style="text-align:right;"> 0.667 </td>
##    <td style="text-align:right;"> 0.067 </td>
##    <td style="text-align:right;"> 0.599 </td>
##    <td style="text-align:right;"> 0.988 </td>
##    <td style="text-align:right;"> 0.652 </td>
##    <td style="text-align:right;"> 0.017 </td>
##   </tr>
##   <tr>
##    <td style="text-align:left;"> 60% </td>
##    <td style="text-align:right;"> 0.614 </td>
##    <td style="text-align:right;"> 0.032 </td>
##    <td style="text-align:right;"> 0.654 </td>
##    <td style="text-align:right;"> 0.061 </td>
##    <td style="text-align:right;"> 0.574 </td>
##    <td style="text-align:right;"> 0.987 </td>
##    <td style="text-align:right;"> 0.634 </td>
##    <td style="text-align:right;"> 0.021 </td>
##   </tr>
##   <tr>
##    <td style="text-align:left;"> 70% </td>
##    <td style="text-align:right;"> 0.567 </td>
##    <td style="text-align:right;"> 0.028 </td>
##    <td style="text-align:right;"> 0.550 </td>
##    <td style="text-align:right;"> 0.054 </td>
##    <td style="text-align:right;"> 0.585 </td>
##    <td style="text-align:right;"> 0.983 </td>
##    <td style="text-align:right;"> 0.582 </td>
##    <td style="text-align:right;"> 0.024 </td>
##   </tr>
##   <tr>
##    <td style="text-align:left;"> 80% </td>
##    <td style="text-align:right;"> 0.632 </td>
##    <td style="text-align:right;"> 0.033 </td>
##    <td style="text-align:right;"> 0.692 </td>
##    <td style="text-align:right;"> 0.064 </td>
##    <td style="text-align:right;"> 0.571 </td>
##    <td style="text-align:right;"> 0.989 </td>
##    <td style="text-align:right;"> 0.623 </td>
##    <td style="text-align:right;"> 0.020 </td>
##   </tr>
##   <tr>
##    <td style="text-align:left;"> 90% </td>
##    <td style="text-align:right;"> 0.714 </td>
##    <td style="text-align:right;"> 0.044 </td>
##    <td style="text-align:right;"> 0.857 </td>
##    <td style="text-align:right;"> 0.084 </td>
##    <td style="text-align:right;"> 0.571 </td>
##    <td style="text-align:right;"> 0.994 </td>
##    <td style="text-align:right;"> 0.785 </td>
##    <td style="text-align:right;"> 0.039 </td>
##   </tr>
## </tbody>
## </table>
df1 <- confusion_matrix_to_df(cm1a_50)
df2 <- confusion_matrix_to_df(cm1a_60)
df3 <- confusion_matrix_to_df(cm1a_70)
df4 <- confusion_matrix_to_df(cm1a_80)
df5 <- confusion_matrix_to_df(cm1a_90)

# Create individual plots
M1aplot1 <- plot_confusion_matrix(df1, "M1a 50%")
M1aplot2 <- plot_confusion_matrix(df2, "M1a 60%")
M1aplot3 <- plot_confusion_matrix(df3, "M1a 70%")
M1aplot4 <- plot_confusion_matrix(df4, "M1a 80%")
M1aplot5 <- plot_confusion_matrix(df5, "M1a 90%")


# Arrange the plots side by side
grid.arrange(M1aplot1, M1aplot2, M1aplot3, M1aplot4, M1aplot5, ncol = 3)

## M2b: Ohlson Re-estimated

m2b_50=myGLMfit(train1[-c(164, 403, 906, 996, 1143,1478), c(1, 50,51, 46,52,56,53,54,57,55)],test1[, c(1, 50,51, 46,52,56,53,54,57,55)])
## Setting levels: control = 0, case = 1
## Setting direction: controls < cases

m2b_60=myGLMfit(train2[-393, c(1, 50,51, 46,52,56,53,54,57,55)],test2[, c(1, 50,51, 46,52,56,53,54,57,55)])
## Setting levels: control = 0, case = 1
## Setting direction: controls < cases

m2b_70=myGLMfit(train3[-c(102, 138, 275,1086, 1785, 2163), c(1, 50,51, 46,52,56,53,54,57,55)],test3[, c(1, 50,51, 46,52,56,53,54,57,55)])
## Setting levels: control = 0, case = 1
## Setting direction: controls < cases

m2b_80=myGLMfit(train4[-c(517,1182), c(1, 50,51, 46,52,56,53,54,57,55)],test4[, c(1, 50,51, 46,52,56,53,54,57,55)])
## Setting levels: control = 0, case = 1
## Setting direction: controls < cases

m2b_90=myGLMfit(train5[-c(1334, 1335,  1997,2004),c(1, 50,51, 46,52,56,53,54,57,55)],test5[, c(1, 50,51, 46,52,56,53,54,57,55)])
## Setting levels: control = 0, case = 1
## Setting direction: controls < cases

print(colnames(train1[, c(1, 50,51, 46,52,56,53,54,57,55)]))
##  [1] "Bankrupt"       "OhlsonX1.y.1."  "OhlsonX2.y.1."  "Alt1Ohls3.y.1."
##  [5] "OhlsonX4.y.1."  "OhlsonX5.y.1."  "OhlsonX6.y.1."  "OhlsonX7.y.1." 
##  [9] "OhlsonX8.y.1."  "OhlsonX9.y.1."
cm2b_50 = m2b_50$confusion_matrix
cm2b_60 = m2b_60$confusion_matrix
cm2b_70 = m2b_70$confusion_matrix
cm2b_80 = m2b_80$confusion_matrix
cm2b_90 = m2b_90$confusion_matrix


gc()
##            used  (Mb) gc trigger  (Mb) max used  (Mb)
## Ncells  5554844 296.7    8671144 463.1  8671144 463.1
## Vcells 18515099 141.3   31091163 237.3 25842636 197.2
mymat2b=rbind(cm2b_50$byClass,cm2b_60$byClass,cm2b_70$byClass,cm2b_80$byClass, cm2b_90$byClass)
colnames(mymat2b)=names(cm2b_50$byClass)
rownames(mymat2b)=c('50%', '60%', '70%', '80%','90%')

myCoefmat2b=rbind(m2b_50$coefficients,m2b_60$coefficients,m2b_70$coefficients,m2b_80$coefficients, m2b_90$coefficients )

rownames(myCoefmat2b)=c('50%', '60%', '70%', '80%', '90%')

M2b Output

t2b=round(cbind(mymat2b[, c(11, 5,6,7, 2,4, 12,13)],myCoefmat2b),3)
myprint(t2b)
## <table class=" lightable-classic table" style='font-size: 16px; font-family: "Arial Narrow", "Source Sans Pro", sans-serif; width: auto !important; margin-left: auto; margin-right: auto; font-size: Cambria; margin-left: auto; margin-right: auto;'>
##  <thead>
##   <tr>
##    <th style="text-align:left;">   </th>
##    <th style="text-align:right;"> Balanced Accuracy </th>
##    <th style="text-align:right;"> Precision </th>
##    <th style="text-align:right;"> Recall </th>
##    <th style="text-align:right;"> F1 </th>
##    <th style="text-align:right;"> Specificity </th>
##    <th style="text-align:right;"> Neg Pred Value </th>
##    <th style="text-align:right;"> AUC </th>
##    <th style="text-align:right;"> PR_AUC </th>
##    <th style="text-align:right;"> (Intercept) </th>
##    <th style="text-align:right;"> OhlsonX1.y.1. </th>
##    <th style="text-align:right;"> OhlsonX2.y.1. </th>
##    <th style="text-align:right;"> Alt1Ohls3.y.1. </th>
##    <th style="text-align:right;"> OhlsonX4.y.1. </th>
##    <th style="text-align:right;"> OhlsonX5.y.1. </th>
##    <th style="text-align:right;"> OhlsonX6.y.1. </th>
##    <th style="text-align:right;"> OhlsonX7.y.1. </th>
##    <th style="text-align:right;"> OhlsonX8.y.1. </th>
##    <th style="text-align:right;"> OhlsonX9.y.1. </th>
##   </tr>
##  </thead>
## <tbody>
##   <tr>
##    <td style="text-align:left;"> 50% </td>
##    <td style="text-align:right;"> 0.682 </td>
##    <td style="text-align:right;"> 0.061 </td>
##    <td style="text-align:right;"> 0.545 </td>
##    <td style="text-align:right;"> 0.110 </td>
##    <td style="text-align:right;"> 0.818 </td>
##    <td style="text-align:right;"> 0.988 </td>
##    <td style="text-align:right;"> 0.728 </td>
##    <td style="text-align:right;"> 0.045 </td>
##    <td style="text-align:right;"> 19.096 </td>
##    <td style="text-align:right;"> -8.015 </td>
##    <td style="text-align:right;"> 0.378 </td>
##    <td style="text-align:right;"> 0.199 </td>
##    <td style="text-align:right;"> 0.056 </td>
##    <td style="text-align:right;"> -1.907 </td>
##    <td style="text-align:right;"> -5.228 </td>
##    <td style="text-align:right;"> 0 </td>
##    <td style="text-align:right;"> 0.587 </td>
##    <td style="text-align:right;"> 0 </td>
##   </tr>
##   <tr>
##    <td style="text-align:left;"> 60% </td>
##    <td style="text-align:right;"> 0.587 </td>
##    <td style="text-align:right;"> 0.035 </td>
##    <td style="text-align:right;"> 0.423 </td>
##    <td style="text-align:right;"> 0.065 </td>
##    <td style="text-align:right;"> 0.751 </td>
##    <td style="text-align:right;"> 0.984 </td>
##    <td style="text-align:right;"> 0.712 </td>
##    <td style="text-align:right;"> 0.035 </td>
##    <td style="text-align:right;"> 30.803 </td>
##    <td style="text-align:right;"> -12.768 </td>
##    <td style="text-align:right;"> 0.000 </td>
##    <td style="text-align:right;"> 0.000 </td>
##    <td style="text-align:right;"> 0.211 </td>
##    <td style="text-align:right;"> -0.173 </td>
##    <td style="text-align:right;"> 0.000 </td>
##    <td style="text-align:right;"> 0 </td>
##    <td style="text-align:right;"> 0.096 </td>
##    <td style="text-align:right;"> 0 </td>
##   </tr>
##   <tr>
##    <td style="text-align:left;"> 70% </td>
##    <td style="text-align:right;"> 0.607 </td>
##    <td style="text-align:right;"> 0.040 </td>
##    <td style="text-align:right;"> 0.450 </td>
##    <td style="text-align:right;"> 0.074 </td>
##    <td style="text-align:right;"> 0.764 </td>
##    <td style="text-align:right;"> 0.984 </td>
##    <td style="text-align:right;"> 0.704 </td>
##    <td style="text-align:right;"> 0.038 </td>
##    <td style="text-align:right;"> 28.249 </td>
##    <td style="text-align:right;"> -11.834 </td>
##    <td style="text-align:right;"> 0.000 </td>
##    <td style="text-align:right;"> 0.000 </td>
##    <td style="text-align:right;"> 0.135 </td>
##    <td style="text-align:right;"> -1.203 </td>
##    <td style="text-align:right;"> 0.000 </td>
##    <td style="text-align:right;"> 0 </td>
##    <td style="text-align:right;"> 1.209 </td>
##    <td style="text-align:right;"> 0 </td>
##   </tr>
##   <tr>
##    <td style="text-align:left;"> 80% </td>
##    <td style="text-align:right;"> 0.695 </td>
##    <td style="text-align:right;"> 0.047 </td>
##    <td style="text-align:right;"> 0.692 </td>
##    <td style="text-align:right;"> 0.088 </td>
##    <td style="text-align:right;"> 0.698 </td>
##    <td style="text-align:right;"> 0.991 </td>
##    <td style="text-align:right;"> 0.749 </td>
##    <td style="text-align:right;"> 0.045 </td>
##    <td style="text-align:right;"> 24.405 </td>
##    <td style="text-align:right;"> -9.973 </td>
##    <td style="text-align:right;"> 0.000 </td>
##    <td style="text-align:right;"> 0.000 </td>
##    <td style="text-align:right;"> 0.172 </td>
##    <td style="text-align:right;"> -1.371 </td>
##    <td style="text-align:right;"> 0.000 </td>
##    <td style="text-align:right;"> 0 </td>
##    <td style="text-align:right;"> -0.037 </td>
##    <td style="text-align:right;"> 0 </td>
##   </tr>
##   <tr>
##    <td style="text-align:left;"> 90% </td>
##    <td style="text-align:right;"> 0.660 </td>
##    <td style="text-align:right;"> 0.050 </td>
##    <td style="text-align:right;"> 0.571 </td>
##    <td style="text-align:right;"> 0.092 </td>
##    <td style="text-align:right;"> 0.749 </td>
##    <td style="text-align:right;"> 0.987 </td>
##    <td style="text-align:right;"> 0.765 </td>
##    <td style="text-align:right;"> 0.185 </td>
##    <td style="text-align:right;"> 29.772 </td>
##    <td style="text-align:right;"> -12.383 </td>
##    <td style="text-align:right;"> 0.000 </td>
##    <td style="text-align:right;"> 0.000 </td>
##    <td style="text-align:right;"> 0.094 </td>
##    <td style="text-align:right;"> -0.596 </td>
##    <td style="text-align:right;"> 0.000 </td>
##    <td style="text-align:right;"> 0 </td>
##    <td style="text-align:right;"> 0.616 </td>
##    <td style="text-align:right;"> 0 </td>
##   </tr>
## </tbody>
## </table>
#glm_summary(m2b_50$mod)

df1 <- confusion_matrix_to_df(cm2b_50)
df2 <- confusion_matrix_to_df(cm2b_60)
df3 <- confusion_matrix_to_df(cm2b_70)
df4 <- confusion_matrix_to_df(cm2b_80)
df5 <- confusion_matrix_to_df(cm2b_90)

# Create individual plots
M2bplot1 <- plot_confusion_matrix(df1, "M2b 50%")
M2bplot2 <- plot_confusion_matrix(df2, "M2b 60%")
M2bplot3 <- plot_confusion_matrix(df3, "M2b 70%")
M2bplot4 <- plot_confusion_matrix(df4, "M2b 80%")
M2bplot5 <- plot_confusion_matrix(df5, "M2b 90%")


# Arrange the plots side by side
grid.arrange(M2bplot1, M2bplot2, M2bplot3, M2bplot4, M2bplot5, ncol = 3)

M2a: Ohlson Original

myohl=function(test) 
  {
  test$OhlsonX1.y.1.[test$OhlsonX1.y.1.<0]=.1
  test$OhlsonX1.y.1.=log(test$OhlsonX1.y.1.)
  
  #Ohlson Score
  test$O = 
    -1.32
  -0.407*test$OhlsonX1.y.1.
  +6.03*test$OhlsonX2.y.1.
  -1.43*test$Alt1Ohls3.y.1.
  +0.0757*test$OhlsonX4.y.1.
  -2.37*test$OhlsonX5.y.1.
  -1.83*test$OhlsonX6.y.1.
  +0.285*test$OhlsonX7.y.1.
  -1.72*test$OhlsonX8.y.1.
  -0.521*test$OhlsonX9.y.1.
  
  #Convert to Probabilities
  suppressWarnings({
  lnprob=(test$O)-log((1+exp(test$O)))
  prob=exp(lnprob)
  test$Decision=ifelse(prob<.5,0,1) 
  cm=caret::confusionMatrix(as.factor(test$Decision), as.factor(test$Bankrupt), positive="1", mode = "prec_recall")
  
  #Curves
  roc_curve <- roc(test$Bankrupt, test$O)$auc
  pr=pr.curve(scores.class0 = test$Decision, weights.class0 = test$Bankrupt)$auc.integral
  
    # Add AUC and PR AUC to the confusion matrix results
  cm$byClass <- c(cm$byClass, AUC = roc_curve, PR_AUC = pr)
  
  return(cm)
 
  })

}

print(colnames(test1[, c(1,50,51, 46,52,56,53,54,57,55)]))
##  [1] "Bankrupt"       "OhlsonX1.y.1."  "OhlsonX2.y.1."  "Alt1Ohls3.y.1."
##  [5] "OhlsonX4.y.1."  "OhlsonX5.y.1."  "OhlsonX6.y.1."  "OhlsonX7.y.1." 
##  [9] "OhlsonX8.y.1."  "OhlsonX9.y.1."
cm2a_50=myohl(test1[, c(1, 50,51, 46,52,56,53,54,57,55)])
## Setting levels: control = 0, case = 1
## Setting direction: controls < cases
cm2a_60=myohl(test2[, c(1, 50,51, 46,52,56,53,54,57,55)])
## Setting levels: control = 0, case = 1
## Setting direction: controls < cases
cm2a_70=myohl(test3[, c(1, 50,51, 46,52,56,53,54,57,55)])
## Setting levels: control = 0, case = 1
## Setting direction: controls < cases
cm2a_80=myohl(test4[, c(1, 50,51, 46,52,56,53,54,57,55)])
## Setting levels: control = 0, case = 1
## Setting direction: controls < cases
cm2a_90=myohl(test5[, c(1, 50,51, 46,52,56,53,54,57,55)])
## Setting levels: control = 0, case = 1
## Setting direction: controls < cases

M2a Output

mymat2a=rbind(cm2a_50$byClass,cm2a_60$byClass,cm2a_70$byClass,cm2a_80$byClass,cm2a_90$byClass)
rownames(mymat2a)=c('50%', '60%', '70%', '80%' , '90%')
myprint(round(mymat2a[, c(11, 5,6,7, 2,4, 12,13)],3))
## <table class=" lightable-classic table" style='font-size: 16px; font-family: "Arial Narrow", "Source Sans Pro", sans-serif; width: auto !important; margin-left: auto; margin-right: auto; font-size: Cambria; margin-left: auto; margin-right: auto;'>
##  <thead>
##   <tr>
##    <th style="text-align:left;">   </th>
##    <th style="text-align:right;"> Balanced Accuracy </th>
##    <th style="text-align:right;"> Precision </th>
##    <th style="text-align:right;"> Recall </th>
##    <th style="text-align:right;"> F1 </th>
##    <th style="text-align:right;"> Specificity </th>
##    <th style="text-align:right;"> Neg Pred Value </th>
##    <th style="text-align:right;"> AUC </th>
##    <th style="text-align:right;"> PR_AUC </th>
##   </tr>
##  </thead>
## <tbody>
##   <tr>
##    <td style="text-align:left;"> 50% </td>
##    <td style="text-align:right;"> 0.5 </td>
##    <td style="text-align:right;"> NA </td>
##    <td style="text-align:right;"> 0 </td>
##    <td style="text-align:right;"> NA </td>
##    <td style="text-align:right;"> 1 </td>
##    <td style="text-align:right;"> 0.979 </td>
##    <td style="text-align:right;"> 0.5 </td>
##    <td style="text-align:right;"> 0.021 </td>
##   </tr>
##   <tr>
##    <td style="text-align:left;"> 60% </td>
##    <td style="text-align:right;"> 0.5 </td>
##    <td style="text-align:right;"> NA </td>
##    <td style="text-align:right;"> 0 </td>
##    <td style="text-align:right;"> NA </td>
##    <td style="text-align:right;"> 1 </td>
##    <td style="text-align:right;"> 0.979 </td>
##    <td style="text-align:right;"> 0.5 </td>
##    <td style="text-align:right;"> 0.021 </td>
##   </tr>
##   <tr>
##    <td style="text-align:left;"> 70% </td>
##    <td style="text-align:right;"> 0.5 </td>
##    <td style="text-align:right;"> NA </td>
##    <td style="text-align:right;"> 0 </td>
##    <td style="text-align:right;"> NA </td>
##    <td style="text-align:right;"> 1 </td>
##    <td style="text-align:right;"> 0.978 </td>
##    <td style="text-align:right;"> 0.5 </td>
##    <td style="text-align:right;"> 0.022 </td>
##   </tr>
##   <tr>
##    <td style="text-align:left;"> 80% </td>
##    <td style="text-align:right;"> 0.5 </td>
##    <td style="text-align:right;"> NA </td>
##    <td style="text-align:right;"> 0 </td>
##    <td style="text-align:right;"> NA </td>
##    <td style="text-align:right;"> 1 </td>
##    <td style="text-align:right;"> 0.979 </td>
##    <td style="text-align:right;"> 0.5 </td>
##    <td style="text-align:right;"> 0.021 </td>
##   </tr>
##   <tr>
##    <td style="text-align:left;"> 90% </td>
##    <td style="text-align:right;"> 0.5 </td>
##    <td style="text-align:right;"> NA </td>
##    <td style="text-align:right;"> 0 </td>
##    <td style="text-align:right;"> NA </td>
##    <td style="text-align:right;"> 1 </td>
##    <td style="text-align:right;"> 0.977 </td>
##    <td style="text-align:right;"> 0.5 </td>
##    <td style="text-align:right;"> 0.023 </td>
##   </tr>
## </tbody>
## </table>
df1 <- confusion_matrix_to_df(cm2a_50)
df2 <- confusion_matrix_to_df(cm2a_60)
df3 <- confusion_matrix_to_df(cm2a_70)
df4 <- confusion_matrix_to_df(cm2a_80)
df5 <- confusion_matrix_to_df(cm2a_90)

# Create individual plots
M2aplot1 <- plot_confusion_matrix(df1, "M2a 50%")
M2aplot2 <- plot_confusion_matrix(df2, "M2a 60%")
M2aplot3 <- plot_confusion_matrix(df3, "M2a 70%")
M2aplot4 <- plot_confusion_matrix(df4, "M2a 80%")
M2aplot5 <- plot_confusion_matrix(df5, "M2a 90%")


# Arrange the plots side by side
grid.arrange(M2aplot1, M2aplot2, M2aplot3, M2aplot4, M2aplot5, ncol = 3)

M3b: Zmijewski Re-estimated

print(colnames(test1[,c(1,53,51,52)]))
## [1] "Bankrupt"      "OhlsonX6.y.1." "OhlsonX2.y.1." "OhlsonX4.y.1."
m3b_50=myGLMfit(train1[,c(1,53,51,52)],test1[,c(1,53,51,52)])
## Setting levels: control = 0, case = 1
## Setting direction: controls < cases

m3b_60=myGLMfit(train2[,c(1,53,51,52)],test2[,c(1,53,51,52)])
## Setting levels: control = 0, case = 1
## Setting direction: controls < cases

m3b_70=myGLMfit(train3[-c(102,1050,2163),c(1,53,51,52)],test3[,c(1,53,51,52)])
## Setting levels: control = 0, case = 1
## Setting direction: controls > cases

m3b_80=myGLMfit(train4[,c(1,53,51,52)],test4[,c(1,53,51,52)])
## Setting levels: control = 0, case = 1
## Setting direction: controls < cases

m3b_90=myGLMfit(train5[,c(1,53,51,52)],test5[,c(1,53,51,52)])
## Setting levels: control = 0, case = 1
## Setting direction: controls < cases

cm3b_50 = m3b_50$confusion_matrix
cm3b_60 = m3b_60$confusion_matrix
cm3b_70 = m3b_70$confusion_matrix
cm3b_80 = m3b_80$confusion_matrix
cm3b_90 = m3b_90$confusion_matrix

mymat3b=rbind(cm3b_50$byClass,cm3b_60$byClass,cm3b_70$byClass,cm3b_80$byClass, cm3b_90$byClass)
colnames(mymat3b)=names(cm3b_50$byClass)
rownames(mymat3b)=c('50%', '60%', '70%', '80%', '90%')

myCoefmat3b=rbind(m3b_50$coefficients,m3b_60$coefficients,m3b_70$coefficients,m3b_80$coefficients, m3b_90$coefficients )
rownames(myCoefmat3b)=c('50%', '60%', '70%', '80%', '90%')

M3b Output

t3b=round(cbind(mymat3b[, c(11, 5,6,7, 2,4, 12,13)],myCoefmat3b),3)
myprint(t3b)
## <table class=" lightable-classic table" style='font-size: 16px; font-family: "Arial Narrow", "Source Sans Pro", sans-serif; width: auto !important; margin-left: auto; margin-right: auto; font-size: Cambria; margin-left: auto; margin-right: auto;'>
##  <thead>
##   <tr>
##    <th style="text-align:left;">   </th>
##    <th style="text-align:right;"> Balanced Accuracy </th>
##    <th style="text-align:right;"> Precision </th>
##    <th style="text-align:right;"> Recall </th>
##    <th style="text-align:right;"> F1 </th>
##    <th style="text-align:right;"> Specificity </th>
##    <th style="text-align:right;"> Neg Pred Value </th>
##    <th style="text-align:right;"> AUC </th>
##    <th style="text-align:right;"> PR_AUC </th>
##    <th style="text-align:right;"> (Intercept) </th>
##    <th style="text-align:right;"> OhlsonX6.y.1. </th>
##    <th style="text-align:right;"> OhlsonX2.y.1. </th>
##    <th style="text-align:right;"> OhlsonX4.y.1. </th>
##   </tr>
##  </thead>
## <tbody>
##   <tr>
##    <td style="text-align:left;"> 50% </td>
##    <td style="text-align:right;"> 0.605 </td>
##    <td style="text-align:right;"> 0.039 </td>
##    <td style="text-align:right;"> 0.455 </td>
##    <td style="text-align:right;"> 0.072 </td>
##    <td style="text-align:right;"> 0.755 </td>
##    <td style="text-align:right;"> 0.984 </td>
##    <td style="text-align:right;"> 0.590 </td>
##    <td style="text-align:right;"> 0.038 </td>
##    <td style="text-align:right;"> -0.095 </td>
##    <td style="text-align:right;"> 0 </td>
##    <td style="text-align:right;"> 0 </td>
##    <td style="text-align:right;"> 0.120 </td>
##   </tr>
##   <tr>
##    <td style="text-align:left;"> 60% </td>
##    <td style="text-align:right;"> 0.576 </td>
##    <td style="text-align:right;"> 0.037 </td>
##    <td style="text-align:right;"> 0.346 </td>
##    <td style="text-align:right;"> 0.066 </td>
##    <td style="text-align:right;"> 0.805 </td>
##    <td style="text-align:right;"> 0.983 </td>
##    <td style="text-align:right;"> 0.508 </td>
##    <td style="text-align:right;"> 0.028 </td>
##    <td style="text-align:right;"> -0.365 </td>
##    <td style="text-align:right;"> 0 </td>
##    <td style="text-align:right;"> 0 </td>
##    <td style="text-align:right;"> 0.395 </td>
##   </tr>
##   <tr>
##    <td style="text-align:left;"> 70% </td>
##    <td style="text-align:right;"> 0.573 </td>
##    <td style="text-align:right;"> 0.036 </td>
##    <td style="text-align:right;"> 0.350 </td>
##    <td style="text-align:right;"> 0.066 </td>
##    <td style="text-align:right;"> 0.795 </td>
##    <td style="text-align:right;"> 0.982 </td>
##    <td style="text-align:right;"> 0.504 </td>
##    <td style="text-align:right;"> 0.031 </td>
##    <td style="text-align:right;"> -0.195 </td>
##    <td style="text-align:right;"> 0 </td>
##    <td style="text-align:right;"> 0 </td>
##    <td style="text-align:right;"> 0.215 </td>
##   </tr>
##   <tr>
##    <td style="text-align:left;"> 80% </td>
##    <td style="text-align:right;"> 0.614 </td>
##    <td style="text-align:right;"> 0.041 </td>
##    <td style="text-align:right;"> 0.462 </td>
##    <td style="text-align:right;"> 0.075 </td>
##    <td style="text-align:right;"> 0.766 </td>
##    <td style="text-align:right;"> 0.985 </td>
##    <td style="text-align:right;"> 0.582 </td>
##    <td style="text-align:right;"> 0.043 </td>
##    <td style="text-align:right;"> -0.125 </td>
##    <td style="text-align:right;"> 0 </td>
##    <td style="text-align:right;"> 0 </td>
##    <td style="text-align:right;"> 0.150 </td>
##   </tr>
##   <tr>
##    <td style="text-align:left;"> 90% </td>
##    <td style="text-align:right;"> 0.549 </td>
##    <td style="text-align:right;"> 0.034 </td>
##    <td style="text-align:right;"> 0.286 </td>
##    <td style="text-align:right;"> 0.061 </td>
##    <td style="text-align:right;"> 0.812 </td>
##    <td style="text-align:right;"> 0.980 </td>
##    <td style="text-align:right;"> 0.541 </td>
##    <td style="text-align:right;"> 0.029 </td>
##    <td style="text-align:right;"> -0.210 </td>
##    <td style="text-align:right;"> 0 </td>
##    <td style="text-align:right;"> 0 </td>
##    <td style="text-align:right;"> 0.222 </td>
##   </tr>
## </tbody>
## </table>
df1 <- confusion_matrix_to_df(cm3b_50)
df2 <- confusion_matrix_to_df(cm3b_60)
df3 <- confusion_matrix_to_df(cm3b_70)
df4 <- confusion_matrix_to_df(cm3b_80)
df5 <- confusion_matrix_to_df(cm3b_90)

# Create individual plots
M3bplot1 <- plot_confusion_matrix(df1, "M3b 50%")
M3bplot2 <- plot_confusion_matrix(df2, "M3b 60%")
M3bplot3 <- plot_confusion_matrix(df3, "M3b 70%")
M3bplot4 <- plot_confusion_matrix(df4, "M3b 80%")
M3bplot5 <- plot_confusion_matrix(df5, "M3b 90%")


# Arrange the plots side by side
grid.arrange(M3bplot1, M3bplot2, M3bplot3, M3bplot4, M3bplot5, ncol = 3)

M3a: Zmijewski Original

myzm=function(test) 
  {
  
  test$OhlsonX4.y.1.= 1/test$OhlsonX4.y.1. #Reciprical
  test$OhlsonX4.y.1.[test$OhlsonX4.y.1.==Inf]=5
  test$ZM=
  -4.336
  -4.513*test[,2]
  +5.679*test[,3] 
  +0.004*test[,4]
  
  test$Decision=ifelse(test$ZM>.5,0,1) 

  #Convert to Probabilities
  suppressWarnings({
  cm=caret::confusionMatrix(as.factor(test$Decision), as.factor(test$Bankrupt), positive="1", mode = "prec_recall")
    # Calculate ROC AUC
  roc_curve <- roc(test$Bankrupt, test$ZM)$auc
  pr=pr.curve(scores.class0 = test$Decision, weights.class0 = test$Bankrupt)$auc.integral
  
  # Add AUC and PR AUC to the confusion matrix results
  cm$byClass <- c(cm$byClass, AUC = roc_curve, PR_AUC = pr)
  
  return(cm)
 
  })
  
  }

print(colnames(test1[,c(1,53,51,52)]))
## [1] "Bankrupt"      "OhlsonX6.y.1." "OhlsonX2.y.1." "OhlsonX4.y.1."
cm3a_50=myzm(test1[,c(1,53,51,52)])
## Setting levels: control = 0, case = 1
## Setting direction: controls < cases
cm3a_60=myzm(test2[,c(1,53,51,52)])
## Setting levels: control = 0, case = 1
## Setting direction: controls < cases
cm3a_70=myzm(test3[,c(1,53,51,52)])
## Setting levels: control = 0, case = 1
## Setting direction: controls < cases
cm3a_80=myzm(test4[,c(1,53,51,52)])
## Setting levels: control = 0, case = 1
## Setting direction: controls < cases
cm3a_90=myzm(test5[,c(1,53,51,52)])
## Setting levels: control = 0, case = 1
## Setting direction: controls < cases

M3a Output

mymat3a=rbind(cm3a_50$byClass,cm3a_60$byClass,cm3a_70$byClass,cm3a_80$byClass,cm3a_90$byClass)
rownames(mymat3a)=c('50%', '60%', '70%', '80%' , '90%')
myprint(round(mymat3a[, c(11, 5,6,7, 2,4, 12,13)],3))
## <table class=" lightable-classic table" style='font-size: 16px; font-family: "Arial Narrow", "Source Sans Pro", sans-serif; width: auto !important; margin-left: auto; margin-right: auto; font-size: Cambria; margin-left: auto; margin-right: auto;'>
##  <thead>
##   <tr>
##    <th style="text-align:left;">   </th>
##    <th style="text-align:right;"> Balanced Accuracy </th>
##    <th style="text-align:right;"> Precision </th>
##    <th style="text-align:right;"> Recall </th>
##    <th style="text-align:right;"> F1 </th>
##    <th style="text-align:right;"> Specificity </th>
##    <th style="text-align:right;"> Neg Pred Value </th>
##    <th style="text-align:right;"> AUC </th>
##    <th style="text-align:right;"> PR_AUC </th>
##   </tr>
##  </thead>
## <tbody>
##   <tr>
##    <td style="text-align:left;"> 50% </td>
##    <td style="text-align:right;"> 0.5 </td>
##    <td style="text-align:right;"> 0.021 </td>
##    <td style="text-align:right;"> 1 </td>
##    <td style="text-align:right;"> 0.042 </td>
##    <td style="text-align:right;"> 0 </td>
##    <td style="text-align:right;"> NaN </td>
##    <td style="text-align:right;"> 0.5 </td>
##    <td style="text-align:right;"> 0.021 </td>
##   </tr>
##   <tr>
##    <td style="text-align:left;"> 60% </td>
##    <td style="text-align:right;"> 0.5 </td>
##    <td style="text-align:right;"> 0.021 </td>
##    <td style="text-align:right;"> 1 </td>
##    <td style="text-align:right;"> 0.041 </td>
##    <td style="text-align:right;"> 0 </td>
##    <td style="text-align:right;"> NaN </td>
##    <td style="text-align:right;"> 0.5 </td>
##    <td style="text-align:right;"> 0.021 </td>
##   </tr>
##   <tr>
##    <td style="text-align:left;"> 70% </td>
##    <td style="text-align:right;"> 0.5 </td>
##    <td style="text-align:right;"> 0.022 </td>
##    <td style="text-align:right;"> 1 </td>
##    <td style="text-align:right;"> 0.042 </td>
##    <td style="text-align:right;"> 0 </td>
##    <td style="text-align:right;"> NaN </td>
##    <td style="text-align:right;"> 0.5 </td>
##    <td style="text-align:right;"> 0.022 </td>
##   </tr>
##   <tr>
##    <td style="text-align:left;"> 80% </td>
##    <td style="text-align:right;"> 0.5 </td>
##    <td style="text-align:right;"> 0.021 </td>
##    <td style="text-align:right;"> 1 </td>
##    <td style="text-align:right;"> 0.041 </td>
##    <td style="text-align:right;"> 0 </td>
##    <td style="text-align:right;"> NaN </td>
##    <td style="text-align:right;"> 0.5 </td>
##    <td style="text-align:right;"> 0.021 </td>
##   </tr>
##   <tr>
##    <td style="text-align:left;"> 90% </td>
##    <td style="text-align:right;"> 0.5 </td>
##    <td style="text-align:right;"> 0.023 </td>
##    <td style="text-align:right;"> 1 </td>
##    <td style="text-align:right;"> 0.044 </td>
##    <td style="text-align:right;"> 0 </td>
##    <td style="text-align:right;"> NaN </td>
##    <td style="text-align:right;"> 0.5 </td>
##    <td style="text-align:right;"> 0.023 </td>
##   </tr>
## </tbody>
## </table>
df1 <- confusion_matrix_to_df(cm3a_50)
df2 <- confusion_matrix_to_df(cm3a_60)
df3 <- confusion_matrix_to_df(cm3a_70)
df4 <- confusion_matrix_to_df(cm3a_80)
df5 <- confusion_matrix_to_df(cm3a_90)

# Create individual plots
M3aplot1 <- plot_confusion_matrix(df1, "M3a 50%")
M3aplot2 <- plot_confusion_matrix(df2, "M3a 60%")
M3aplot3 <- plot_confusion_matrix(df3, "M3a 70%")
M3aplot4 <- plot_confusion_matrix(df4, "M3a 80%")
M3aplot5 <- plot_confusion_matrix(df5, "M3a 90%")


# Arrange the plots side by side
grid.arrange(M3aplot1, M3aplot2, M3aplot3, M3aplot4, M3aplot5, ncol = 3)

3-Fold CV ENet for Variable Selection

knitr::include_graphics("variable_comparison.png")

logistic_elasticnet_cv <- function(train_set, k_folds = 3, top_n = 10) {
  
  # Min-max scaling function
  min_max_scale <- function(df) {
    return(as.data.frame(lapply(df, function(x) (x - min(x, na.rm = TRUE)) / (max(x, na.rm = TRUE) - min(x, na.rm = TRUE)))))
  }
  
  # Remove outliers based on Cook's distance
  remove_outliers <- function(df, response_var) {
    model <- glm(Bankrupt ~ ., data = df, family = "binomial")
    cooks_d <- cooks.distance(model)
    outliers <- which(cooks_d > (4 / nrow(df)))
    return(df[-outliers, ])
  }
  
  # Prepare data: scale and ensure complete cases
  train_set <- train_set %>%
    mutate(across(everything(), as.numeric)) %>%
    filter(complete.cases(.))
  
  # Remove outliers
  train_set <- remove_outliers(train_set, response_var = "Bankrupt")
  
  response <- train_set$Bankrupt
  predictors <- train_set[, -which(names(train_set) == "Bankrupt")]
  
  # Min-max scale predictors
  scaled_predictors <- min_max_scale(predictors)
  scaled_train_set <- cbind(scaled_predictors, Bankrupt = response)
  
  # Remove near-zero variance predictors
  nzv <- nearZeroVar(scaled_train_set, saveMetrics = TRUE)
  if (any(nzv$nzv)) {
    scaled_train_set <- scaled_train_set[, !nzv$nzv]
  }
  
  # Prepare data for glmnet
  x <- as.matrix(scaled_train_set %>% dplyr::select(-Bankrupt))
  y <- as.factor(scaled_train_set$Bankrupt)
  
  # Create stratified folds
  folds <- createFolds(y, k = k_folds, list = TRUE, returnTrain = TRUE)
  
  # K-fold cross-validation for glmnet with Elastic Net
  alphas <- seq(0, 1, by = 0.1)  # Range of alpha values to test
  best_alpha <- 0
  best_lambda <- 0
  min_cv_error <- Inf
  best_fit <- NULL
  
  for (alpha in alphas) {
    cv_errors <- numeric(k_folds)
    fits <- vector("list", k_folds)
    
    for (i in seq_along(folds)) {
      train_index <- folds[[i]]
      x_train <- x[train_index, ]
      y_train <- y[train_index]
      x_test <- x[-train_index, ]
      y_test <- y[-train_index]
      
      suppressWarnings({fit <- cv.glmnet(x_train, y_train, family = "binomial", alpha = alpha, nfolds = k_folds, type.measure = "class")})
      fits[[i]] <- fit
      cv_errors[i] <- min(fit$cvm)
    }
    
    mean_cv_error <- mean(cv_errors)
    
    if (mean_cv_error < min_cv_error) {
      min_cv_error <- mean_cv_error
      best_alpha <- alpha
      best_lambda <- mean(sapply(fits, function(f) f$lambda.min))
      best_fit <- fits[[which.min(cv_errors)]]
    }
  }
  
  # Extract coefficients from the best model
  final_model <- glmnet(x, y, family = "binomial", alpha = best_alpha, lambda = best_lambda, standardize = FALSE, intercept = TRUE)
  coef <- as.matrix(coef(final_model))
  
  # Get variable names selected by Elastic Net and their coefficients
  coef_df <- data.frame(variable = rownames(coef), coefficient = coef[, 1])
  coef_df <- coef_df[coef_df$variable != "(Intercept)", ]
  coef_df <- coef_df[order(abs(coef_df$coefficient), decreasing = TRUE), ]
  
  # Select the top_n variables
  selected_variables <- head(coef_df$variable, top_n)
  
  return(list(selected_variables = selected_variables, best_alpha = best_alpha, best_lambda = best_lambda))
}


# Example usage
# Assuming train1 is your dataset and 'Bankrupt' is the response variable
result1 <- logistic_elasticnet_cv(train1[, c(1,2, 27:29, 34:105)])
## Warning: glm.fit: algorithm did not converge
## Warning: glm.fit: fitted probabilities numerically 0 or 1 occurred
result2 <- logistic_elasticnet_cv(train2[, c(1,2, 27:29, 34:105)])
## Warning: glm.fit: algorithm did not converge
## Warning: glm.fit: fitted probabilities numerically 0 or 1 occurred
result3 <- logistic_elasticnet_cv(train2[, c(1,2, 27:29, 34:105)])
## Warning: glm.fit: algorithm did not converge
## Warning: glm.fit: fitted probabilities numerically 0 or 1 occurred
result4 <- logistic_elasticnet_cv(train2[, c(1,2, 27:29, 34:105)])
## Warning: glm.fit: algorithm did not converge
## Warning: glm.fit: fitted probabilities numerically 0 or 1 occurred
result5 <- logistic_elasticnet_cv(train2[, c(1,2, 27:29, 34:105)])
## Warning: glm.fit: algorithm did not converge
## Warning: glm.fit: fitted probabilities numerically 0 or 1 occurred
mydf=cbind(sort(result1$selected_variables),sort(result2$selected_variables),sort(result3$selected_variables),
           sort(result4$selected_variables),sort(result5$selected_variables))
colnames(mydf)=c('50','60','70','80','90')
mydf
##       50                    60                    70                   
##  [1,] "AR_by_OpIncome.y.1." "AdjPxDays.y.1."      "AdjPxDays.y.1."     
##  [2,] "BedUtil.y.1."        "AR_by_OpIncome.y.1." "AR_by_OpIncome.y.1."
##  [3,] "BedUtil.y.2."        "AR_by_OpIncome.y.2." "AR_by_OpIncome.y.2."
##  [4,] "D_BedUtil"           "BedUtil.y.1."        "BedUtil.y.1."       
##  [5,] "D_Debt2Equity"       "BedUtil.y.2."        "BedUtil.y.2."       
##  [6,] "D_OhlsonX4"          "D_OhlsonX4"          "D_OhlsonX4"         
##  [7,] "Govt"                "DaysCashOnHand.y.2." "DaysCashOnHand.y.2."
##  [8,] "HC4_5.y.1."          "Govt"                "Govt"               
##  [9,] "LaborCompRatio.y.1." "HC4_5.y.1."          "HC4_5.y.1."         
## [10,] "Urban"               "OhlsonX1.y.2."       "OhlsonX1.y.2."      
##       80                    90                   
##  [1,] "AdjPxDays.y.1."      "AdjPxDays.y.1."     
##  [2,] "AR_by_OpIncome.y.1." "AR_by_OpIncome.y.1."
##  [3,] "AR_by_OpIncome.y.2." "AR_by_OpIncome.y.2."
##  [4,] "BedUtil.y.1."        "BedUtil.y.1."       
##  [5,] "BedUtil.y.2."        "BedUtil.y.2."       
##  [6,] "D_OhlsonX4"          "D_OhlsonX4"         
##  [7,] "DaysCashOnHand.y.2." "DaysCashOnHand.y.2."
##  [8,] "Govt"                "Govt"               
##  [9,] "HC4_5.y.1."          "HC4_5.y.1."         
## [10,] "OhlsonX1.y.2."       "OhlsonX1.y.2."

M4a:BKFSST

btrain1=train1[,c(1, 45, 34, 59, 44, 69, 100, 68, 27, 58)]
btrain2=train2[,c(1, 45, 34, 59, 44, 69, 100, 68, 27, 58)]
btrain3=train3[,c(1, 45, 34, 59, 44, 69, 100, 68, 27, 58)]
btrain4=train4[,c(1, 45, 34, 59, 44, 69, 100, 68, 27, 58)]
btrain5=train5[,c(1, 45, 34, 59, 44, 69, 100, 68, 27, 58)]

btest1=test1[,c(1, 45, 34, 59, 44, 69, 100, 68, 27, 58)]
btest2=test2[,c(1, 45, 34, 59, 44, 69, 100, 68, 27, 58)]
btest3=test3[,c(1, 45, 34, 59, 44, 69, 100, 68, 27, 58)]
btest4=test4[,c(1, 45, 34, 59, 44, 69, 100, 68, 27, 58)]
btest5=test5[,c(1, 45, 34, 59, 44, 69, 100, 68, 27, 58)]

m4a_50=myGLMfit(btrain1,btest1)
## Setting levels: control = 0, case = 1
## Setting direction: controls < cases

m4a_60=myGLMfit(btrain2,btest2)
## Setting levels: control = 0, case = 1
## Setting direction: controls < cases

m4a_70=myGLMfit(btrain3,btest3)
## Setting levels: control = 0, case = 1
## Setting direction: controls < cases

m4a_80=myGLMfit(btrain4,btest4)
## Setting levels: control = 0, case = 1
## Setting direction: controls < cases

m4a_90=myGLMfit(btrain5,btest5)
## Setting levels: control = 0, case = 1
## Setting direction: controls < cases

cm4a_50 = m4a_50$confusion_matrix
cm4a_60 = m4a_60$confusion_matrix
cm4a_70 = m4a_70$confusion_matrix
cm4a_80 = m4a_80$confusion_matrix
cm4a_90 = m4a_90$confusion_matrix

mymat4a=rbind(cm4a_50$byClass,cm4a_60$byClass,cm4a_70$byClass,cm4a_80$byClass, cm4a_90$byClass)
colnames(mymat4a)=names(cm4a_50$byClass)
rownames(mymat4a)=c('50%', '60%', '70%', '80%', '90%')

myCoefmat4a=rbind(m4a_50$coefficients,m4a_60$coefficients,m4a_70$coefficients,m4a_80$coefficients,m4a_90$coefficients )
rownames(myCoefmat4a)=c('50%', '60%', '70%', '80%', '90%')

M4a Output

t4a=round(cbind(mymat4a[, c(11, 5,6,7, 2,4, 12,13)],myCoefmat4a),3)
myprint(t4a)
## <table class=" lightable-classic table" style='font-size: 16px; font-family: "Arial Narrow", "Source Sans Pro", sans-serif; width: auto !important; margin-left: auto; margin-right: auto; font-size: Cambria; margin-left: auto; margin-right: auto;'>
##  <thead>
##   <tr>
##    <th style="text-align:left;">   </th>
##    <th style="text-align:right;"> Balanced Accuracy </th>
##    <th style="text-align:right;"> Precision </th>
##    <th style="text-align:right;"> Recall </th>
##    <th style="text-align:right;"> F1 </th>
##    <th style="text-align:right;"> Specificity </th>
##    <th style="text-align:right;"> Neg Pred Value </th>
##    <th style="text-align:right;"> AUC </th>
##    <th style="text-align:right;"> PR_AUC </th>
##    <th style="text-align:right;"> (Intercept) </th>
##    <th style="text-align:right;"> AdjPxDays.y.1. </th>
##    <th style="text-align:right;"> AR_by_OpIncome.y.1. </th>
##    <th style="text-align:right;"> AR_by_OpIncome.y.2. </th>
##    <th style="text-align:right;"> BedUtil.y.1. </th>
##    <th style="text-align:right;"> BedUtil.y.2. </th>
##    <th style="text-align:right;"> D_OhlsonX4 </th>
##    <th style="text-align:right;"> DaysCashOnHand.y.2. </th>
##    <th style="text-align:right;"> Govt </th>
##    <th style="text-align:right;"> HC4_5.y.1. </th>
##   </tr>
##  </thead>
## <tbody>
##   <tr>
##    <td style="text-align:left;"> 50% </td>
##    <td style="text-align:right;"> 0.702 </td>
##    <td style="text-align:right;"> 0.068 </td>
##    <td style="text-align:right;"> 0.576 </td>
##    <td style="text-align:right;"> 0.121 </td>
##    <td style="text-align:right;"> 0.827 </td>
##    <td style="text-align:right;"> 0.989 </td>
##    <td style="text-align:right;"> 0.812 </td>
##    <td style="text-align:right;"> 0.078 </td>
##    <td style="text-align:right;"> 4.465 </td>
##    <td style="text-align:right;"> -0.124 </td>
##    <td style="text-align:right;"> -0.429 </td>
##    <td style="text-align:right;"> -0.211 </td>
##    <td style="text-align:right;"> -5.334 </td>
##    <td style="text-align:right;"> 1.525 </td>
##    <td style="text-align:right;"> 0.506 </td>
##    <td style="text-align:right;"> -0.005 </td>
##    <td style="text-align:right;"> -4.830 </td>
##    <td style="text-align:right;"> -4.842 </td>
##   </tr>
##   <tr>
##    <td style="text-align:left;"> 60% </td>
##    <td style="text-align:right;"> 0.787 </td>
##    <td style="text-align:right;"> 0.078 </td>
##    <td style="text-align:right;"> 0.769 </td>
##    <td style="text-align:right;"> 0.142 </td>
##    <td style="text-align:right;"> 0.805 </td>
##    <td style="text-align:right;"> 0.994 </td>
##    <td style="text-align:right;"> 0.846 </td>
##    <td style="text-align:right;"> 0.072 </td>
##    <td style="text-align:right;"> 5.099 </td>
##    <td style="text-align:right;"> -0.130 </td>
##    <td style="text-align:right;"> -0.299 </td>
##    <td style="text-align:right;"> -0.348 </td>
##    <td style="text-align:right;"> 0.437 </td>
##    <td style="text-align:right;"> -4.977 </td>
##    <td style="text-align:right;"> 0.079 </td>
##    <td style="text-align:right;"> -0.011 </td>
##    <td style="text-align:right;"> -2.913 </td>
##    <td style="text-align:right;"> -3.052 </td>
##   </tr>
##   <tr>
##    <td style="text-align:left;"> 70% </td>
##    <td style="text-align:right;"> 0.643 </td>
##    <td style="text-align:right;"> 0.057 </td>
##    <td style="text-align:right;"> 0.450 </td>
##    <td style="text-align:right;"> 0.101 </td>
##    <td style="text-align:right;"> 0.836 </td>
##    <td style="text-align:right;"> 0.986 </td>
##    <td style="text-align:right;"> 0.805 </td>
##    <td style="text-align:right;"> 0.068 </td>
##    <td style="text-align:right;"> 4.356 </td>
##    <td style="text-align:right;"> -0.182 </td>
##    <td style="text-align:right;"> -0.478 </td>
##    <td style="text-align:right;"> -0.274 </td>
##    <td style="text-align:right;"> -1.805 </td>
##    <td style="text-align:right;"> -0.297 </td>
##    <td style="text-align:right;"> 0.159 </td>
##    <td style="text-align:right;"> -0.002 </td>
##    <td style="text-align:right;"> -4.148 </td>
##    <td style="text-align:right;"> -3.828 </td>
##   </tr>
##   <tr>
##    <td style="text-align:left;"> 80% </td>
##    <td style="text-align:right;"> 0.737 </td>
##    <td style="text-align:right;"> 0.064 </td>
##    <td style="text-align:right;"> 0.692 </td>
##    <td style="text-align:right;"> 0.117 </td>
##    <td style="text-align:right;"> 0.782 </td>
##    <td style="text-align:right;"> 0.992 </td>
##    <td style="text-align:right;"> 0.854 </td>
##    <td style="text-align:right;"> 0.192 </td>
##    <td style="text-align:right;"> 4.163 </td>
##    <td style="text-align:right;"> -0.124 </td>
##    <td style="text-align:right;"> -0.423 </td>
##    <td style="text-align:right;"> -0.091 </td>
##    <td style="text-align:right;"> 0.800 </td>
##    <td style="text-align:right;"> -3.948 </td>
##    <td style="text-align:right;"> 0.146 </td>
##    <td style="text-align:right;"> -0.005 </td>
##    <td style="text-align:right;"> -3.255 </td>
##    <td style="text-align:right;"> -3.738 </td>
##   </tr>
##   <tr>
##    <td style="text-align:left;"> 90% </td>
##    <td style="text-align:right;"> 0.780 </td>
##    <td style="text-align:right;"> 0.096 </td>
##    <td style="text-align:right;"> 0.714 </td>
##    <td style="text-align:right;"> 0.169 </td>
##    <td style="text-align:right;"> 0.845 </td>
##    <td style="text-align:right;"> 0.992 </td>
##    <td style="text-align:right;"> 0.880 </td>
##    <td style="text-align:right;"> 0.089 </td>
##    <td style="text-align:right;"> 4.202 </td>
##    <td style="text-align:right;"> -0.165 </td>
##    <td style="text-align:right;"> -0.395 </td>
##    <td style="text-align:right;"> -0.211 </td>
##    <td style="text-align:right;"> 2.459 </td>
##    <td style="text-align:right;"> -5.386 </td>
##    <td style="text-align:right;"> 0.166 </td>
##    <td style="text-align:right;"> -0.003 </td>
##    <td style="text-align:right;"> -3.967 </td>
##    <td style="text-align:right;"> -3.513 </td>
##   </tr>
## </tbody>
## </table>
df1 <- confusion_matrix_to_df(cm4a_50)
df2 <- confusion_matrix_to_df(cm4a_60)
df3 <- confusion_matrix_to_df(cm4a_70)
df4 <- confusion_matrix_to_df(cm4a_80)
df5 <- confusion_matrix_to_df(cm4a_90)

# Create individual plots
M4aplot1 <- plot_confusion_matrix(df1, "M4a 50%")
M4aplot2 <- plot_confusion_matrix(df2, "M4a 60%")
M4aplot3 <- plot_confusion_matrix(df3, "M4a 70%")
M4aplot4 <- plot_confusion_matrix(df4, "M4a 80%")
M4aplot5 <- plot_confusion_matrix(df5, "M4a 90%")


# Arrange the plots side by side
grid.arrange(M4aplot1, M4aplot2, M4aplot3, M4aplot4, M4aplot5, ncol = 3)

M4b BRKFSST

m4b_50 <- myPerceptronFit(btrain1,btest1)
## Setting levels: control = 0, case = 1
## Setting direction: controls < cases
m4b_60 <- myPerceptronFit(btrain2,btest2)
## Setting levels: control = 0, case = 1
## Setting direction: controls < cases
m4b_70 <- myPerceptronFit(btrain3,btest3)
## Setting levels: control = 0, case = 1
## Setting direction: controls < cases
m4b_80 <- myPerceptronFit(btrain4,btest4)
## Setting levels: control = 0, case = 1
## Setting direction: controls < cases
m4b_90 <- myPerceptronFit(btrain5,btest5)
## Setting levels: control = 0, case = 1
## Setting direction: controls < cases
cm4b_50 = m4b_50$confusion_matrix
cm4b_60 = m4b_60$confusion_matrix
cm4b_70 = m4b_70$confusion_matrix
cm4b_80 = m4b_80$confusion_matrix
cm4b_90 = m4b_90$confusion_matrix

mymat4b=rbind(cm4b_50$byClass,cm4b_60$byClass,cm4b_70$byClass,cm4b_80$byClass, cm4b_90$byClass)
colnames(mymat4b)=names(cm4b_50$byClass)
rownames(mymat4b)=c('50%', '60%', '70%', '80%', '90%')

myCoefmat4b=rbind(
                  m4b_50$coefficients$weight,
                  m4b_60$coefficients$weight,
                  m4b_70$coefficients$weight,
                  m4b_80$coefficients$weight,
                  m4b_90$coefficients$weight )
rownames(myCoefmat4b)=c('50%', '60%', '70%', '80%', '90%')
colnames(myCoefmat4b)=m4b_50$coefficients$variable

M4b Output

t4b=round(cbind(mymat4b[, c(11, 5,6,7, 2,4, 12,13)],myCoefmat4b),3)
myprint(t4b)
## <table class=" lightable-classic table" style='font-size: 16px; font-family: "Arial Narrow", "Source Sans Pro", sans-serif; width: auto !important; margin-left: auto; margin-right: auto; font-size: Cambria; margin-left: auto; margin-right: auto;'>
##  <thead>
##   <tr>
##    <th style="text-align:left;">   </th>
##    <th style="text-align:right;"> Balanced Accuracy </th>
##    <th style="text-align:right;"> Precision </th>
##    <th style="text-align:right;"> Recall </th>
##    <th style="text-align:right;"> F1 </th>
##    <th style="text-align:right;"> Specificity </th>
##    <th style="text-align:right;"> Neg Pred Value </th>
##    <th style="text-align:right;"> AUC </th>
##    <th style="text-align:right;"> AUCpr </th>
##    <th style="text-align:right;"> (Bias) </th>
##    <th style="text-align:right;"> AdjPxDays.y.1. </th>
##    <th style="text-align:right;"> AR_by_OpIncome.y.1. </th>
##    <th style="text-align:right;"> AR_by_OpIncome.y.2. </th>
##    <th style="text-align:right;"> BedUtil.y.1. </th>
##    <th style="text-align:right;"> BedUtil.y.2. </th>
##    <th style="text-align:right;"> D_OhlsonX4 </th>
##    <th style="text-align:right;"> DaysCashOnHand.y.2. </th>
##    <th style="text-align:right;"> Govt </th>
##    <th style="text-align:right;"> HC4_5.y.1. </th>
##   </tr>
##  </thead>
## <tbody>
##   <tr>
##    <td style="text-align:left;"> 50% </td>
##    <td style="text-align:right;"> 0.657 </td>
##    <td style="text-align:right;"> 0.032 </td>
##    <td style="text-align:right;"> 0.909 </td>
##    <td style="text-align:right;"> 0.062 </td>
##    <td style="text-align:right;"> 0.405 </td>
##    <td style="text-align:right;"> 0.995 </td>
##    <td style="text-align:right;"> 0.769 </td>
##    <td style="text-align:right;"> 0.061 </td>
##    <td style="text-align:right;"> -13.910 </td>
##    <td style="text-align:right;"> -1.485 </td>
##    <td style="text-align:right;"> -12.812 </td>
##    <td style="text-align:right;"> -12.304 </td>
##    <td style="text-align:right;"> -10.312 </td>
##    <td style="text-align:right;"> -11.385 </td>
##    <td style="text-align:right;"> -3.009 </td>
##    <td style="text-align:right;"> -3.971 </td>
##    <td style="text-align:right;"> -6.167 </td>
##    <td style="text-align:right;"> -16.380 </td>
##   </tr>
##   <tr>
##    <td style="text-align:left;"> 60% </td>
##    <td style="text-align:right;"> 0.495 </td>
##    <td style="text-align:right;"> 0.000 </td>
##    <td style="text-align:right;"> 0.000 </td>
##    <td style="text-align:right;"> NaN </td>
##    <td style="text-align:right;"> 0.991 </td>
##    <td style="text-align:right;"> 0.979 </td>
##    <td style="text-align:right;"> 0.781 </td>
##    <td style="text-align:right;"> 0.055 </td>
##    <td style="text-align:right;"> -13.103 </td>
##    <td style="text-align:right;"> -1.012 </td>
##    <td style="text-align:right;"> -8.601 </td>
##    <td style="text-align:right;"> -8.968 </td>
##    <td style="text-align:right;"> -8.205 </td>
##    <td style="text-align:right;"> -9.647 </td>
##    <td style="text-align:right;"> -7.755 </td>
##    <td style="text-align:right;"> -2.666 </td>
##    <td style="text-align:right;"> -3.285 </td>
##    <td style="text-align:right;"> -10.372 </td>
##   </tr>
##   <tr>
##    <td style="text-align:left;"> 70% </td>
##    <td style="text-align:right;"> 0.492 </td>
##    <td style="text-align:right;"> 0.000 </td>
##    <td style="text-align:right;"> 0.000 </td>
##    <td style="text-align:right;"> NaN </td>
##    <td style="text-align:right;"> 0.983 </td>
##    <td style="text-align:right;"> 0.978 </td>
##    <td style="text-align:right;"> 0.796 </td>
##    <td style="text-align:right;"> 0.058 </td>
##    <td style="text-align:right;"> -8.854 </td>
##    <td style="text-align:right;"> 0.629 </td>
##    <td style="text-align:right;"> -3.403 </td>
##    <td style="text-align:right;"> 5.131 </td>
##    <td style="text-align:right;"> -5.933 </td>
##    <td style="text-align:right;"> -6.429 </td>
##    <td style="text-align:right;"> -1.020 </td>
##    <td style="text-align:right;"> -4.500 </td>
##    <td style="text-align:right;"> 1.824 </td>
##    <td style="text-align:right;"> -2.902 </td>
##   </tr>
##   <tr>
##    <td style="text-align:left;"> 80% </td>
##    <td style="text-align:right;"> 0.778 </td>
##    <td style="text-align:right;"> 0.059 </td>
##    <td style="text-align:right;"> 0.846 </td>
##    <td style="text-align:right;"> 0.110 </td>
##    <td style="text-align:right;"> 0.710 </td>
##    <td style="text-align:right;"> 0.995 </td>
##    <td style="text-align:right;"> 0.835 </td>
##    <td style="text-align:right;"> 0.102 </td>
##    <td style="text-align:right;"> -9.153 </td>
##    <td style="text-align:right;"> -1.671 </td>
##    <td style="text-align:right;"> -3.545 </td>
##    <td style="text-align:right;"> -3.638 </td>
##    <td style="text-align:right;"> -4.924 </td>
##    <td style="text-align:right;"> -6.947 </td>
##    <td style="text-align:right;"> -4.278 </td>
##    <td style="text-align:right;"> -3.272 </td>
##    <td style="text-align:right;"> -0.484 </td>
##    <td style="text-align:right;"> -5.568 </td>
##   </tr>
##   <tr>
##    <td style="text-align:left;"> 90% </td>
##    <td style="text-align:right;"> 0.674 </td>
##    <td style="text-align:right;"> 0.038 </td>
##    <td style="text-align:right;"> 0.857 </td>
##    <td style="text-align:right;"> 0.072 </td>
##    <td style="text-align:right;"> 0.492 </td>
##    <td style="text-align:right;"> 0.993 </td>
##    <td style="text-align:right;"> 0.790 </td>
##    <td style="text-align:right;"> 0.058 </td>
##    <td style="text-align:right;"> -9.828 </td>
##    <td style="text-align:right;"> -0.543 </td>
##    <td style="text-align:right;"> -2.818 </td>
##    <td style="text-align:right;"> -4.446 </td>
##    <td style="text-align:right;"> -3.497 </td>
##    <td style="text-align:right;"> -5.451 </td>
##    <td style="text-align:right;"> -4.532 </td>
##    <td style="text-align:right;"> -3.575 </td>
##    <td style="text-align:right;"> -2.845 </td>
##    <td style="text-align:right;"> -4.258 </td>
##   </tr>
## </tbody>
## </table>
df1 <- confusion_matrix_to_df(cm4b_50)
df2 <- confusion_matrix_to_df(cm4b_60)
df3 <- confusion_matrix_to_df(cm4b_70)
df4 <- confusion_matrix_to_df(cm4b_80)
df5 <- confusion_matrix_to_df(cm4b_90)

# Create individual plots
M4bplot1 <- plot_confusion_matrix(df1, "M4b 50%")
M4bplot2 <- plot_confusion_matrix(df2, "M4b 60%")
M4bplot3 <- plot_confusion_matrix(df3, "M4b 70%")
M4bplot4 <- plot_confusion_matrix(df4, "M4b 80%")
M4bplot5 <- plot_confusion_matrix(df5, "M4b 90%")


# Arrange the plots side by side
grid.arrange(M4bplot1, M4bplot2, M4bplot3, M4bplot4, M4bplot5, ncol = 3)

M4c BRKFSST

m4c_50 <- mySVMFit(btrain1,btest1)
##  Setting default kernel parameters
m4c_60 <- mySVMFit(btrain2,btest2)
##  Setting default kernel parameters
m4c_70 <- mySVMFit(btrain3,btest3)
##  Setting default kernel parameters
m4c_80 <- mySVMFit(btrain4,btest4)
##  Setting default kernel parameters
m4c_90 <- mySVMFit(btrain5,btest5)
##  Setting default kernel parameters
cm4c_50 = m4b_50$confusion_matrix
cm4c_60 = m4b_60$confusion_matrix
cm4c_70 = m4b_70$confusion_matrix
cm4c_80 = m4b_80$confusion_matrix
cm4c_90 = m4b_90$confusion_matrix

mymat4c=rbind(cm4c_50$byClass,cm4c_60$byClass,cm4c_70$byClass,cm4c_80$byClass, cm4c_90$byClass)
colnames(mymat4c)=names(cm4c_50$byClass)
rownames(mymat4c)=c('50%', '60%', '70%', '80%', '90%')

myCoefmat4c=rbind(m4c_50$coefficients,m4c_60$coefficients,m4c_70$coefficients,m4c_80$coefficients,m4c_90$coefficients )
rownames(myCoefmat4c)=c('50%', '60%', '70%', '80%', '90%')

M4c Output

t4c=round(cbind(mymat4c[, c(11, 5,6,7, 2,4, 12,13)],myCoefmat4c),3)
myprint(t4c)
## <table class=" lightable-classic table" style='font-size: 16px; font-family: "Arial Narrow", "Source Sans Pro", sans-serif; width: auto !important; margin-left: auto; margin-right: auto; font-size: Cambria; margin-left: auto; margin-right: auto;'>
##  <thead>
##   <tr>
##    <th style="text-align:left;">   </th>
##    <th style="text-align:right;"> Balanced Accuracy </th>
##    <th style="text-align:right;"> Precision </th>
##    <th style="text-align:right;"> Recall </th>
##    <th style="text-align:right;"> F1 </th>
##    <th style="text-align:right;"> Specificity </th>
##    <th style="text-align:right;"> Neg Pred Value </th>
##    <th style="text-align:right;"> AUC </th>
##    <th style="text-align:right;"> AUCpr </th>
##    <th style="text-align:right;"> AdjPxDays.y.1. </th>
##    <th style="text-align:right;"> AR_by_OpIncome.y.1. </th>
##    <th style="text-align:right;"> AR_by_OpIncome.y.2. </th>
##    <th style="text-align:right;"> BedUtil.y.1. </th>
##    <th style="text-align:right;"> BedUtil.y.2. </th>
##    <th style="text-align:right;"> D_OhlsonX4 </th>
##    <th style="text-align:right;"> DaysCashOnHand.y.2. </th>
##    <th style="text-align:right;"> Govt </th>
##    <th style="text-align:right;"> HC4_5.y.1. </th>
##   </tr>
##  </thead>
## <tbody>
##   <tr>
##    <td style="text-align:left;"> 50% </td>
##    <td style="text-align:right;"> 0.657 </td>
##    <td style="text-align:right;"> 0.032 </td>
##    <td style="text-align:right;"> 0.909 </td>
##    <td style="text-align:right;"> 0.062 </td>
##    <td style="text-align:right;"> 0.405 </td>
##    <td style="text-align:right;"> 0.995 </td>
##    <td style="text-align:right;"> 0.769 </td>
##    <td style="text-align:right;"> 0.061 </td>
##    <td style="text-align:right;"> -4.012 </td>
##    <td style="text-align:right;"> -2.565 </td>
##    <td style="text-align:right;"> -1.303 </td>
##    <td style="text-align:right;"> -3.617 </td>
##    <td style="text-align:right;"> 0.327 </td>
##    <td style="text-align:right;"> 3.094 </td>
##    <td style="text-align:right;"> -3.657 </td>
##    <td style="text-align:right;"> -3.607 </td>
##    <td style="text-align:right;"> -3.167 </td>
##   </tr>
##   <tr>
##    <td style="text-align:left;"> 60% </td>
##    <td style="text-align:right;"> 0.495 </td>
##    <td style="text-align:right;"> 0.000 </td>
##    <td style="text-align:right;"> 0.000 </td>
##    <td style="text-align:right;"> NaN </td>
##    <td style="text-align:right;"> 0.991 </td>
##    <td style="text-align:right;"> 0.979 </td>
##    <td style="text-align:right;"> 0.781 </td>
##    <td style="text-align:right;"> 0.055 </td>
##    <td style="text-align:right;"> -3.973 </td>
##    <td style="text-align:right;"> -1.824 </td>
##    <td style="text-align:right;"> -1.963 </td>
##    <td style="text-align:right;"> 0.212 </td>
##    <td style="text-align:right;"> -3.997 </td>
##    <td style="text-align:right;"> 4.402 </td>
##    <td style="text-align:right;"> -3.146 </td>
##    <td style="text-align:right;"> -2.000 </td>
##    <td style="text-align:right;"> -2.107 </td>
##   </tr>
##   <tr>
##    <td style="text-align:left;"> 70% </td>
##    <td style="text-align:right;"> 0.492 </td>
##    <td style="text-align:right;"> 0.000 </td>
##    <td style="text-align:right;"> 0.000 </td>
##    <td style="text-align:right;"> NaN </td>
##    <td style="text-align:right;"> 0.983 </td>
##    <td style="text-align:right;"> 0.978 </td>
##    <td style="text-align:right;"> 0.796 </td>
##    <td style="text-align:right;"> 0.058 </td>
##    <td style="text-align:right;"> -5.551 </td>
##    <td style="text-align:right;"> -2.564 </td>
##    <td style="text-align:right;"> -1.728 </td>
##    <td style="text-align:right;"> -0.782 </td>
##    <td style="text-align:right;"> -1.636 </td>
##    <td style="text-align:right;"> 3.800 </td>
##    <td style="text-align:right;"> -1.621 </td>
##    <td style="text-align:right;"> -3.068 </td>
##    <td style="text-align:right;"> -2.672 </td>
##   </tr>
##   <tr>
##    <td style="text-align:left;"> 80% </td>
##    <td style="text-align:right;"> 0.778 </td>
##    <td style="text-align:right;"> 0.059 </td>
##    <td style="text-align:right;"> 0.846 </td>
##    <td style="text-align:right;"> 0.110 </td>
##    <td style="text-align:right;"> 0.710 </td>
##    <td style="text-align:right;"> 0.995 </td>
##    <td style="text-align:right;"> 0.835 </td>
##    <td style="text-align:right;"> 0.102 </td>
##    <td style="text-align:right;"> -5.447 </td>
##    <td style="text-align:right;"> -2.696 </td>
##    <td style="text-align:right;"> -0.362 </td>
##    <td style="text-align:right;"> 0.126 </td>
##    <td style="text-align:right;"> -2.415 </td>
##    <td style="text-align:right;"> 3.351 </td>
##    <td style="text-align:right;"> -3.277 </td>
##    <td style="text-align:right;"> -2.818 </td>
##    <td style="text-align:right;"> -2.659 </td>
##   </tr>
##   <tr>
##    <td style="text-align:left;"> 90% </td>
##    <td style="text-align:right;"> 0.674 </td>
##    <td style="text-align:right;"> 0.038 </td>
##    <td style="text-align:right;"> 0.857 </td>
##    <td style="text-align:right;"> 0.072 </td>
##    <td style="text-align:right;"> 0.492 </td>
##    <td style="text-align:right;"> 0.993 </td>
##    <td style="text-align:right;"> 0.790 </td>
##    <td style="text-align:right;"> 0.058 </td>
##    <td style="text-align:right;"> -6.977 </td>
##    <td style="text-align:right;"> -2.387 </td>
##    <td style="text-align:right;"> -1.232 </td>
##    <td style="text-align:right;"> 0.109 </td>
##    <td style="text-align:right;"> -2.550 </td>
##    <td style="text-align:right;"> 6.072 </td>
##    <td style="text-align:right;"> -2.109 </td>
##    <td style="text-align:right;"> -3.000 </td>
##    <td style="text-align:right;"> -2.473 </td>
##   </tr>
## </tbody>
## </table>
df1 <- confusion_matrix_to_df(cm4c_50)
df2 <- confusion_matrix_to_df(cm4c_60)
df3 <- confusion_matrix_to_df(cm4c_70)
df4 <- confusion_matrix_to_df(cm4c_80)
df5 <- confusion_matrix_to_df(cm4c_90)

# Create individual plots
M4cplot1 <- plot_confusion_matrix(df1, "M4c 50%")
M4cplot2 <- plot_confusion_matrix(df2, "M4c 60%")
M4cplot3 <- plot_confusion_matrix(df3, "M4c 70%")
M4cplot4 <- plot_confusion_matrix(df4, "M4c 80%")
M4cplot5 <- plot_confusion_matrix(df5, "M4c 90%")


# Arrange the plots side by side
grid.arrange(M4cplot1, M4cplot2, M4cplot3, M4cplot4, M4cplot5, ncol = 3)

M4d BRKFSST

Non-Recurring Variable Decision Tree (NRVDT)

# Example usage
m4d_50<- fit_decision_tree(btrain1, btest1)
## Setting levels: control = 0, case = 1
## Setting direction: controls < cases

## n= 3026 
## 
## node), split, n, loss, yval, (yprob)
##       * denotes terminal node
## 
##  1) root 3026 1513 0 (0.50000000 0.50000000)  
##    2) AR_by_OpIncome.y.2.< 0.5 926  124 0 (0.86609071 0.13390929) *
##    3) AR_by_OpIncome.y.2.>=0.5 2100  711 1 (0.33857143 0.66142857)  
##      6) AdjPxDays.y.1.< 0.5 230    7 0 (0.96956522 0.03043478) *
##      7) AdjPxDays.y.1.>=0.5 1870  488 1 (0.26096257 0.73903743)  
##       14) HC4_5.y.1.< 0.5 167    9 0 (0.94610778 0.05389222) *
##       15) HC4_5.y.1.>=0.5 1703  330 1 (0.19377569 0.80622431)  
##         30) Govt< 0.5 92    6 0 (0.93478261 0.06521739) *
##         31) Govt>=0.5 1611  244 1 (0.15145872 0.84854128) *
m4d_60<- fit_decision_tree(btrain2, btest2)
## Setting levels: control = 0, case = 1
## Setting direction: controls < cases

## n= 3630 
## 
## node), split, n, loss, yval, (yprob)
##       * denotes terminal node
## 
##  1) root 3630 1815 0 (0.50000000 0.50000000)  
##    2) AR_by_OpIncome.y.2.< 0.5 1493  305 0 (0.79571333 0.20428667)  
##      4) HC4_5.y.1.< 0.5 498    0 0 (1.00000000 0.00000000) *
##      5) HC4_5.y.1.>=0.5 995  305 0 (0.69346734 0.30653266)  
##       10) AdjPxDays.y.1.< 0.5 289   10 0 (0.96539792 0.03460208) *
##       11) AdjPxDays.y.1.>=0.5 706  295 0 (0.58215297 0.41784703)  
##         22) AR_by_OpIncome.y.1.< 0.5 350   83 0 (0.76285714 0.23714286) *
##         23) AR_by_OpIncome.y.1.>=0.5 356  144 1 (0.40449438 0.59550562)  
##           46) Govt< 0.5 39    7 0 (0.82051282 0.17948718) *
##           47) Govt>=0.5 317  112 1 (0.35331230 0.64668770) *
##    3) AR_by_OpIncome.y.2.>=0.5 2137  627 1 (0.29340197 0.70659803)  
##      6) AdjPxDays.y.1.< 0.5 207    6 0 (0.97101449 0.02898551) *
##      7) AdjPxDays.y.1.>=0.5 1930  426 1 (0.22072539 0.77927461)  
##       14) HC4_5.y.1.< 0.5 190   57 0 (0.70000000 0.30000000) *
##       15) HC4_5.y.1.>=0.5 1740  293 1 (0.16839080 0.83160920)  
##         30) Govt< 0.5 137   58 0 (0.57664234 0.42335766) *
##         31) Govt>=0.5 1603  214 1 (0.13349969 0.86650031) *
m4d_70<- fit_decision_tree(btrain3, btest3)
## Setting levels: control = 0, case = 1
## Setting direction: controls < cases

## n= 4236 
## 
## node), split, n, loss, yval, (yprob)
##       * denotes terminal node
## 
##  1) root 4236 2118 0 (0.50000000 0.50000000)  
##    2) AR_by_OpIncome.y.2.< 0.5 1176  113 0 (0.90391156 0.09608844) *
##    3) AR_by_OpIncome.y.2.>=0.5 3060 1055 1 (0.34477124 0.65522876)  
##      6) AdjPxDays.y.1.< 0.5 375   26 0 (0.93066667 0.06933333) *
##      7) AdjPxDays.y.1.>=0.5 2685  706 1 (0.26294227 0.73705773)  
##       14) HC4_5.y.1.< 0.5 273   36 0 (0.86813187 0.13186813) *
##       15) HC4_5.y.1.>=0.5 2412  469 1 (0.19444444 0.80555556)  
##         30) Govt< 0.5 128   20 0 (0.84375000 0.15625000) *
##         31) Govt>=0.5 2284  361 1 (0.15805604 0.84194396)  
##           62) DaysCashOnHand.y.2.< 0.5 24    0 0 (1.00000000 0.00000000) *
##           63) DaysCashOnHand.y.2.>=0.5 2260  337 1 (0.14911504 0.85088496) *
m4d_80 <- fit_decision_tree(btrain4, btest4)
## Setting levels: control = 0, case = 1
## Setting direction: controls < cases

## n= 4840 
## 
## node), split, n, loss, yval, (yprob)
##       * denotes terminal node
## 
##  1) root 4840 2420 0 (0.50000000 0.50000000)  
##    2) AdjPxDays.y.1.< 0.5 998   61 0 (0.93887776 0.06112224) *
##    3) AdjPxDays.y.1.>=0.5 3842 1483 1 (0.38599688 0.61400312)  
##      6) HC4_5.y.1.< 0.5 588   42 0 (0.92857143 0.07142857) *
##      7) HC4_5.y.1.>=0.5 3254  937 1 (0.28795329 0.71204671)  
##       14) AR_by_OpIncome.y.1.< 0.5 626  220 0 (0.64856230 0.35143770)  
##         28) BedUtil.y.1.< 0.5 221   24 0 (0.89140271 0.10859729) *
##         29) BedUtil.y.1.>=0.5 405  196 0 (0.51604938 0.48395062)  
##           58) AR_by_OpIncome.y.2.< 0.5 268   99 0 (0.63059701 0.36940299) *
##           59) AR_by_OpIncome.y.2.>=0.5 137   40 1 (0.29197080 0.70802920) *
##       15) AR_by_OpIncome.y.1.>=0.5 2628  531 1 (0.20205479 0.79794521)  
##         30) Govt< 0.5 182   51 0 (0.71978022 0.28021978) *
##         31) Govt>=0.5 2446  400 1 (0.16353230 0.83646770) *
m4d_90<- fit_decision_tree(btrain5, btest5)
## Setting levels: control = 0, case = 1
## Setting direction: controls < cases

## n= 5446 
## 
## node), split, n, loss, yval, (yprob)
##       * denotes terminal node
## 
##  1) root 5446 2723 0 (0.50000000 0.50000000)  
##    2) AdjPxDays.y.1.< 0.5 1080   39 0 (0.96388889 0.03611111) *
##    3) AdjPxDays.y.1.>=0.5 4366 1682 1 (0.38524966 0.61475034)  
##      6) HC4_5.y.1.< 0.5 674   47 0 (0.93026706 0.06973294) *
##      7) HC4_5.y.1.>=0.5 3692 1055 1 (0.28575298 0.71424702)  
##       14) AR_by_OpIncome.y.1.< 0.5 661  204 0 (0.69137670 0.30862330)  
##         28) BedUtil.y.1.< 0.5 207    6 0 (0.97101449 0.02898551) *
##         29) BedUtil.y.1.>=0.5 454  198 0 (0.56387665 0.43612335)  
##           58) AR_by_OpIncome.y.2.< 0.5 289   84 0 (0.70934256 0.29065744) *
##           59) AR_by_OpIncome.y.2.>=0.5 165   51 1 (0.30909091 0.69090909) *
##       15) AR_by_OpIncome.y.1.>=0.5 3031  598 1 (0.19729462 0.80270538)  
##         30) Govt< 0.5 179   30 0 (0.83240223 0.16759777) *
##         31) Govt>=0.5 2852  449 1 (0.15743338 0.84256662) *
cm4d_50 = m4d_50$confusion_matrix
cm4d_60 = m4d_60$confusion_matrix
cm4d_70 = m4d_70$confusion_matrix
cm4d_80 = m4d_80$confusion_matrix
cm4d_90 = m4d_90$confusion_matrix

mymat4d=rbind(cm4d_50$byClass,cm4d_60$byClass,cm4d_70$byClass,cm4d_80$byClass, cm4d_90$byClass)
colnames(mymat4d)=names(cm4b_50$byClass)
rownames(mymat4d)=c('50%', '60%', '70%', '80%', '90%')

M4d Output

rpart.plot(m4d_50$model, type=5, extra=2)
## Warning: Cannot retrieve the data used to build the model (so cannot determine roundint and is.binary for the variables).
## To silence this warning:
##     Call rpart.plot with roundint=FALSE,
##     or rebuild the rpart model with model=TRUE.

rpart.plot(m4d_60$model, type=5, extra=2)
## Warning: Cannot retrieve the data used to build the model (so cannot determine roundint and is.binary for the variables).
## To silence this warning:
##     Call rpart.plot with roundint=FALSE,
##     or rebuild the rpart model with model=TRUE.

rpart.plot(m4d_70$model, type=5, extra=2)
## Warning: Cannot retrieve the data used to build the model (so cannot determine roundint and is.binary for the variables).
## To silence this warning:
##     Call rpart.plot with roundint=FALSE,
##     or rebuild the rpart model with model=TRUE.

rpart.plot(m4d_80$model, type=5, extra=2)
## Warning: Cannot retrieve the data used to build the model (so cannot determine roundint and is.binary for the variables).
## To silence this warning:
##     Call rpart.plot with roundint=FALSE,
##     or rebuild the rpart model with model=TRUE.

rpart.plot(m4d_90$model, type=5, extra=2)
## Warning: Cannot retrieve the data used to build the model (so cannot determine roundint and is.binary for the variables).
## To silence this warning:
##     Call rpart.plot with roundint=FALSE,
##     or rebuild the rpart model with model=TRUE.

myprint(round(mymat4d[, c(11, 5,6,7, 2,4, 12,13)],3))
## <table class=" lightable-classic table" style='font-size: 16px; font-family: "Arial Narrow", "Source Sans Pro", sans-serif; width: auto !important; margin-left: auto; margin-right: auto; font-size: Cambria; margin-left: auto; margin-right: auto;'>
##  <thead>
##   <tr>
##    <th style="text-align:left;">   </th>
##    <th style="text-align:right;"> Balanced Accuracy </th>
##    <th style="text-align:right;"> Precision </th>
##    <th style="text-align:right;"> Recall </th>
##    <th style="text-align:right;"> F1 </th>
##    <th style="text-align:right;"> Specificity </th>
##    <th style="text-align:right;"> Neg Pred Value </th>
##    <th style="text-align:right;"> AUC </th>
##    <th style="text-align:right;"> AUCpr </th>
##   </tr>
##  </thead>
## <tbody>
##   <tr>
##    <td style="text-align:left;"> 50% </td>
##    <td style="text-align:right;"> 0.651 </td>
##    <td style="text-align:right;"> 0.061 </td>
##    <td style="text-align:right;"> 0.455 </td>
##    <td style="text-align:right;"> 0.108 </td>
##    <td style="text-align:right;"> 0.847 </td>
##    <td style="text-align:right;"> 0.986 </td>
##    <td style="text-align:right;"> 0.628 </td>
##    <td style="text-align:right;"> 0.043 </td>
##   </tr>
##   <tr>
##    <td style="text-align:left;"> 60% </td>
##    <td style="text-align:right;"> 0.697 </td>
##    <td style="text-align:right;"> 0.063 </td>
##    <td style="text-align:right;"> 0.577 </td>
##    <td style="text-align:right;"> 0.114 </td>
##    <td style="text-align:right;"> 0.817 </td>
##    <td style="text-align:right;"> 0.989 </td>
##    <td style="text-align:right;"> 0.802 </td>
##    <td style="text-align:right;"> 0.062 </td>
##   </tr>
##   <tr>
##    <td style="text-align:left;"> 70% </td>
##    <td style="text-align:right;"> 0.597 </td>
##    <td style="text-align:right;"> 0.047 </td>
##    <td style="text-align:right;"> 0.350 </td>
##    <td style="text-align:right;"> 0.083 </td>
##    <td style="text-align:right;"> 0.845 </td>
##    <td style="text-align:right;"> 0.983 </td>
##    <td style="text-align:right;"> 0.698 </td>
##    <td style="text-align:right;"> 0.041 </td>
##   </tr>
##   <tr>
##    <td style="text-align:left;"> 80% </td>
##    <td style="text-align:right;"> 0.717 </td>
##    <td style="text-align:right;"> 0.068 </td>
##    <td style="text-align:right;"> 0.615 </td>
##    <td style="text-align:right;"> 0.122 </td>
##    <td style="text-align:right;"> 0.818 </td>
##    <td style="text-align:right;"> 0.990 </td>
##    <td style="text-align:right;"> 0.778 </td>
##    <td style="text-align:right;"> 0.052 </td>
##   </tr>
##   <tr>
##    <td style="text-align:left;"> 90% </td>
##    <td style="text-align:right;"> 0.635 </td>
##    <td style="text-align:right;"> 0.059 </td>
##    <td style="text-align:right;"> 0.429 </td>
##    <td style="text-align:right;"> 0.103 </td>
##    <td style="text-align:right;"> 0.842 </td>
##    <td style="text-align:right;"> 0.985 </td>
##    <td style="text-align:right;"> 0.775 </td>
##    <td style="text-align:right;"> 0.059 </td>
##   </tr>
## </tbody>
## </table>
df1 <- confusion_matrix_to_df(cm4d_50)
df2 <- confusion_matrix_to_df(cm4d_60)
df3 <- confusion_matrix_to_df(cm4d_70)
df4 <- confusion_matrix_to_df(cm4d_80)
df5 <- confusion_matrix_to_df(cm4d_90)

# Create individual plots
M4dplot1 <- plot_confusion_matrix(df1, "M4d 50%")
M4dplot2 <- plot_confusion_matrix(df2, "M4d 60%")
M4dplot3 <- plot_confusion_matrix(df3, "M4d 70%")
M4dplot4 <- plot_confusion_matrix(df4, "M4d 80%")
M4dplot5 <- plot_confusion_matrix(df5, "M4d 90%")


# Arrange the plots side by side
grid.arrange(M4dplot1, M4dplot2, M4dplot3, M4dplot4, M4dplot5, ncol = 3)

COVID Excursion

testdata=bankrupt[bankrupt$Year>2018,]
traindata=bankrupt[bankrupt$Year<=2018,]

cov=function(mod,train, test){
  #predict
  test$Decision=predict(mod, test, type='response')
  test$Decision2=as.factor(ifelse(test$Decision<.5,0,1))
  
  
    # Confusion Matrix
  cm <- caret::confusionMatrix(as.factor(test$Decision2), as.factor(test$Bankrupt), positive = "1", mode = "prec_recall")
  
  # Calculate ROC AUC
  roc_curve <- roc(test$Bankrupt, test$Decision)
  auc_value <- auc(roc_curve)
  
  # Calculate PR AUC
  fg <- test$Decision[test$Bankrupt == 1]
  bg <- test$Decision[test$Bankrupt == 0]
  pr_curve <- pr.curve(scores.class0 = fg, scores.class1 = bg, curve = TRUE)
  pr_auc_value <- pr_curve$auc.integral
  
  # Add AUC and PR AUC to the confusion matrix results
  cm$byClass <- c(cm$byClass, AUC = auc_value, PR_AUC = pr_auc_value)
  
  return(cm)
}

cov1=cov(m4a_50$mod, traindata, testdata)
## Setting levels: control = 0, case = 1
## Setting direction: controls < cases
cov2=cov(m4a_60$mod, traindata, testdata)
## Setting levels: control = 0, case = 1
## Setting direction: controls < cases
cov3=cov(m4a_70$mod, traindata, testdata)
## Setting levels: control = 0, case = 1
## Setting direction: controls < cases
cov4=cov(m4a_80$mod, traindata, testdata)
## Setting levels: control = 0, case = 1
## Setting direction: controls < cases
cov5=cov(m4a_90$mod, traindata, testdata)
## Setting levels: control = 0, case = 1
## Setting direction: controls < cases
covmat=rbind(cov1$byClass,cov2$byClass,cov3$byClass,cov4$byClass,cov5$byClass)
rownames(covmat)=c('50%', '60%', '70%', '80%', '90%')
colnames(covmat)=names(cov1$byClass)
round(covmat[, c(11, 5,6,7, 2,4, 12,13)],3)
##     Balanced Accuracy Precision Recall    F1 Specificity Neg Pred Value   AUC
## 50%             0.686     0.023  0.571 0.044       0.800          0.996 0.754
## 60%             0.743     0.025  0.714 0.048       0.772          0.997 0.760
## 70%             0.616     0.018  0.429 0.034       0.804          0.994 0.722
## 80%             0.738     0.024  0.714 0.046       0.761          0.997 0.775
## 90%             0.612     0.017  0.429 0.032       0.796          0.994 0.748
##     PR_AUC
## 50%  0.018
## 60%  0.019
## 70%  0.016
## 80%  0.018
## 90%  0.016

COVID Output

Two-Lag Excursion

btrain1=train1[,c(1, 27:28, 59:81)]
btrain2=train2[,c(1, 27:28, 59:81)]
btrain3=train3[,c(1, 27:28, 59:81)]
btrain4=train4[,c(1, 27:28, 59:81)]
btrain5=train5[,c(1, 27:28, 59:81)]

btest1=test1[,c(1,27:28, 59:81)]
btest2=test2[,c(1,27:28, 59:81)]
btest3=test3[,c(1,27:28, 59:81)]
btest4=test4[,c(1,27:28, 59:81)]
btest5=test5[,c(1,27:28, 59:81)]

e1a_50=myGLMfit(btrain1,btest1)
## Setting levels: control = 0, case = 1
## Setting direction: controls < cases

e1a_60=myGLMfit(btrain2,btest2)
## Setting levels: control = 0, case = 1
## Setting direction: controls < cases

e1a_70=myGLMfit(btrain3,btest3)
## Setting levels: control = 0, case = 1
## Setting direction: controls < cases

e1a_80=myGLMfit(btrain4,btest4)
## Setting levels: control = 0, case = 1
## Setting direction: controls < cases

e1a_90=myGLMfit(btrain5,btest5)
## Setting levels: control = 0, case = 1
## Setting direction: controls < cases

cme1a_50 = e1a_50$confusion_matrix
cme1a_60 = e1a_60$confusion_matrix
cme1a_70 = e1a_70$confusion_matrix
cme1a_80 = e1a_80$confusion_matrix
cme1a_90 = e1a_90$confusion_matrix

mymate1a=rbind(cme1a_50$byClass,cme1a_60$byClass,cme1a_70$byClass,cme1a_80$byClass, cme1a_90$byClass)
colnames(mymate1a)=names(cme1a_50$byClass)
rownames(mymate1a)=c('50%', '60%', '70%', '80%', '90%')

myCoefmate1a=rbind(e1a_50$coefficients,e1a_60$coefficients,e1a_70$coefficients,e1a_80$coefficients,e1a_90$coefficients )
rownames(myCoefmate1a)=c('50%', '60%', '70%', '80%', '90%')

mydf1a=as.data.frame(myCoefmate1a)

Two-Lag Output

myprint(round(mymate1a[, c(11, 5,6,7, 2,4, 12,13)],3))
## <table class=" lightable-classic table" style='font-size: 16px; font-family: "Arial Narrow", "Source Sans Pro", sans-serif; width: auto !important; margin-left: auto; margin-right: auto; font-size: Cambria; margin-left: auto; margin-right: auto;'>
##  <thead>
##   <tr>
##    <th style="text-align:left;">   </th>
##    <th style="text-align:right;"> Balanced Accuracy </th>
##    <th style="text-align:right;"> Precision </th>
##    <th style="text-align:right;"> Recall </th>
##    <th style="text-align:right;"> F1 </th>
##    <th style="text-align:right;"> Specificity </th>
##    <th style="text-align:right;"> Neg Pred Value </th>
##    <th style="text-align:right;"> AUC </th>
##    <th style="text-align:right;"> PR_AUC </th>
##   </tr>
##  </thead>
## <tbody>
##   <tr>
##    <td style="text-align:left;"> 50% </td>
##    <td style="text-align:right;"> 0.654 </td>
##    <td style="text-align:right;"> 0.057 </td>
##    <td style="text-align:right;"> 0.485 </td>
##    <td style="text-align:right;"> 0.101 </td>
##    <td style="text-align:right;"> 0.824 </td>
##    <td style="text-align:right;"> 0.987 </td>
##    <td style="text-align:right;"> 0.654 </td>
##    <td style="text-align:right;"> 0.043 </td>
##   </tr>
##   <tr>
##    <td style="text-align:left;"> 60% </td>
##    <td style="text-align:right;"> 0.656 </td>
##    <td style="text-align:right;"> 0.039 </td>
##    <td style="text-align:right;"> 0.654 </td>
##    <td style="text-align:right;"> 0.074 </td>
##    <td style="text-align:right;"> 0.657 </td>
##    <td style="text-align:right;"> 0.989 </td>
##    <td style="text-align:right;"> 0.656 </td>
##    <td style="text-align:right;"> 0.035 </td>
##   </tr>
##   <tr>
##    <td style="text-align:left;"> 70% </td>
##    <td style="text-align:right;"> 0.566 </td>
##    <td style="text-align:right;"> 0.045 </td>
##    <td style="text-align:right;"> 0.250 </td>
##    <td style="text-align:right;"> 0.076 </td>
##    <td style="text-align:right;"> 0.882 </td>
##    <td style="text-align:right;"> 0.982 </td>
##    <td style="text-align:right;"> 0.566 </td>
##    <td style="text-align:right;"> 0.031 </td>
##   </tr>
##   <tr>
##    <td style="text-align:left;"> 80% </td>
##    <td style="text-align:right;"> 0.682 </td>
##    <td style="text-align:right;"> 0.039 </td>
##    <td style="text-align:right;"> 0.769 </td>
##    <td style="text-align:right;"> 0.075 </td>
##    <td style="text-align:right;"> 0.596 </td>
##    <td style="text-align:right;"> 0.992 </td>
##    <td style="text-align:right;"> 0.682 </td>
##    <td style="text-align:right;"> 0.037 </td>
##   </tr>
##   <tr>
##    <td style="text-align:left;"> 90% </td>
##    <td style="text-align:right;"> 0.488 </td>
##    <td style="text-align:right;"> 0.021 </td>
##    <td style="text-align:right;"> 0.429 </td>
##    <td style="text-align:right;"> 0.041 </td>
##    <td style="text-align:right;"> 0.548 </td>
##    <td style="text-align:right;"> 0.976 </td>
##    <td style="text-align:right;"> 0.488 </td>
##    <td style="text-align:right;"> 0.022 </td>
##   </tr>
## </tbody>
## </table>
mydf1a
##      (Intercept)          Govt         Urban AR_by_OpIncome.y.2.
## 50% 5.860115e+15 -1.271152e+15 -1.308253e+15       -5.167252e+13
## 60% 3.849724e+15 -9.012940e+14 -1.498206e+15       -1.096069e+14
## 70% 4.131959e+15 -1.209967e+15 -1.073270e+15       -7.136382e+13
## 80% 5.666565e+15 -1.415586e+15 -9.878240e+14       -7.704579e+13
## 90% 5.151907e+15 -1.199141e+15 -1.233755e+15       -6.135084e+13
##     FB_Plus_OpInc_ByFB.y.2. PercentMedicaidDays.y.2. PercentMedicareDays.y.2.
## 50%           -5.311348e+13            -1.652710e+14             7.934729e+14
## 60%           -9.944457e+13             1.011555e+15             1.128660e+15
## 70%           -4.122334e+13             2.555860e+15             1.076396e+15
## 80%           -3.198704e+13             2.025896e+15            -1.554739e+14
## 90%           -1.231741e+13             2.172664e+13            -2.497776e+14
##     CurrentRatio.y.2. Debt2Equity.y.2. DaysSalesOutstanding.y.2.
## 50%     -7.721230e+13     4.189964e+12              9.482992e+11
## 60%     -1.325684e+13     2.000794e+13              3.358152e+12
## 70%     -3.201668e+13     3.961424e+12              4.333527e+12
## 80%     -5.711765e+13     9.588397e+12              3.454253e+12
## 90%     -3.242559e+13     2.786335e+12              1.628687e+12
##     LaborCompRatio.y.2. OpProfitMargin.y.2. DaysCashOnHand.y.2.  BedUtil.y.2.
## 50%        1.453983e+15        6.191348e+14        4.022188e+11 -3.160033e+15
## 60%       -8.143514e+14       -4.200795e+14       -3.445381e+12 -1.293775e+15
## 70%        2.344461e+15        5.179880e+14       -1.210607e+11 -2.087584e+14
## 80%        1.627604e+15        1.096290e+14       -1.999969e+11  1.310331e+15
## 90%       -7.923606e+14       -2.154233e+14       -5.894627e+11 -9.434333e+14
##     AdjPxDays.y.2. Alt1Ohls3.y.2. AltmanX2.y.2. AltmanX3.y.2. AltmanX4.y.2.
## 50%   3.520959e+13        8127220     2619082.2     -12367383    -77921.953
## 60%   9.773136e+11        3317125     -134986.4     -10414754   -162497.099
## 70%   9.581212e+12        2736169     -171413.9     -13011442   -103256.208
## 80%  -6.422379e+12        6663284     -759137.0     -66763769    -76928.542
## 90%  -1.941723e+12        7457613    -1815609.2     -49129640     -5857.288
##     OhlsonX1.y.2. OhlsonX2.y.2. OhlsonX4.y.2. OhlsonX6.y.2. OhlsonX7.y.2.
## 50% -4.595714e+14     -34829555  1.199779e+14     -43471471    -247291.70
## 60% -2.323059e+14      -1102457  6.779510e+12       2223477    -188449.01
## 70% -5.151557e+14      -4323412  3.257231e+12       2856887      33200.27
## 80% -5.504613e+14     -21440944  1.383601e+13      16955945     -64511.00
## 90% -3.114591e+14     -15596382  1.320199e+13       8232476     -89179.49
##     OhlsonX9.y.2. OhlsonX5.y.2.
## 50%      282883.7 -5.955682e+14
## 60%     -484541.9 -8.428968e+12
## 70%     -193496.8 -3.601228e+14
## 80%    -1016722.0 -5.912756e+14
## 90%    -1341263.8 -3.144054e+14

Combined Metrics

myprep=function(mod){
  mod=round(mod,3)
  rownames(mod)=c("M1a","M1b","M2a","M2b","M3a","M3b", "M4a","M4b", "M4c","M4d")
  
highlight_min_max<- function(x) {
  max_value <- max(x, na.rm = TRUE)
  second_max_value <- max(x[x < max_value], na.rm = TRUE)
  min_value <- min(x, na.rm = TRUE)
  formattable::formatter("span",
                         style = x ~ ifelse(is.na(x) | is.nan(x), 
                                            style(background = "darkred", color = "white", font.weight = "bold"),
                                            ifelse(x == max_value, 
                                                   style(background = "darkgreen", color = "white", font.weight = "bold"),
                                                   ifelse(x == second_max_value, 
                                                          style(background = "lightgreen", color = "black", font.weight = "bold"), # Slightly lighter dark green
                                                          ifelse(x == min_value, 
                                                                 style(background = "darkred", color = "white", font.weight = "bold"),
                                                                 NA))))) (x)
}
    
  mod=mod%>%mutate(across(everything(), highlight_min_max))
  formattable(mod)
  

}
metrics=rbind(
mymat1a,
mymat1b,
mymat2a,
mymat2b,
mymat3a,
mymat3b,
mymat4a,
mymat4b,
mymat4c,
mymat4d)




fifty=as.data.frame(metrics[seq(1,50,by=5),c(11, 5,6,7, 2,4, 12,13)])
sixty=as.data.frame(metrics[seq(2,50,by=5),c(11, 5,6,7, 2,4, 12,13)])
seventy=as.data.frame(metrics[seq(3,50,by=5),c(11, 5,6,7, 2,4, 12,13)])
eighty=as.data.frame(metrics[seq(4,50,by=5),c(11, 5,6,7, 2,4, 12,13)])
ninety=as.data.frame(metrics[seq(5,50,by=5),c(11, 5,6,7, 2,4, 12,13)])
              
              
# Apply the custom function to each column
myprep(fifty)
Balanced Accuracy Precision Recall F1 Specificity Neg Pred Value AUC PR_AUC
M1a 0.633 0.035 0.667 0.067 0.599 0.988 0.652 0.017
M1b 0.660 0.054 0.515 0.098 0.804 0.987 0.653 0.047
M2a 0.500 NA 0.000 NA 1.000 0.979 0.500 0.021
M2b 0.682 0.061 0.545 0.110 0.818 0.988 0.728 0.045
M3a 0.500 0.021 1.000 0.042 0.000 NaN 0.500 0.021
M3b 0.605 0.039 0.455 0.072 0.755 0.984 0.590 0.038
M4a 0.702 0.068 0.576 0.121 0.827 0.989 0.812 0.078
M4b 0.657 0.032 0.909 0.062 0.405 0.995 0.769 0.061
M4c 0.657 0.032 0.909 0.062 0.405 0.995 0.769 0.061
M4d 0.651 0.061 0.455 0.108 0.847 0.986 0.628 0.043
myprep(sixty)
Balanced Accuracy Precision Recall F1 Specificity Neg Pred Value AUC PR_AUC
M1a 0.614 0.032 0.654 0.061 0.574 0.987 0.634 0.021
M1b 0.672 0.051 0.577 0.093 0.767 0.988 0.632 0.042
M2a 0.500 NA 0.000 NA 1.000 0.979 0.500 0.021
M2b 0.587 0.035 0.423 0.065 0.751 0.984 0.712 0.035
M3a 0.500 0.021 1.000 0.041 0.000 NaN 0.500 0.021
M3b 0.576 0.037 0.346 0.066 0.805 0.983 0.508 0.028
M4a 0.787 0.078 0.769 0.142 0.805 0.994 0.846 0.072
M4b 0.495 0.000 0.000 NaN 0.991 0.979 0.781 0.055
M4c 0.495 0.000 0.000 NaN 0.991 0.979 0.781 0.055
M4d 0.697 0.063 0.577 0.114 0.817 0.989 0.802 0.062
myprep(seventy)
Balanced Accuracy Precision Recall F1 Specificity Neg Pred Value AUC PR_AUC
M1a 0.567 0.028 0.55 0.054 0.585 0.983 0.582 0.024
M1b 0.462 0.020 0.85 0.039 0.074 0.957 0.485 0.073
M2a 0.500 NA 0.00 NA 1.000 0.978 0.500 0.022
M2b 0.607 0.040 0.45 0.074 0.764 0.984 0.704 0.038
M3a 0.500 0.022 1.00 0.042 0.000 NaN 0.500 0.022
M3b 0.573 0.036 0.35 0.066 0.795 0.982 0.504 0.031
M4a 0.643 0.057 0.45 0.101 0.836 0.986 0.805 0.068
M4b 0.492 0.000 0.00 NaN 0.983 0.978 0.796 0.058
M4c 0.492 0.000 0.00 NaN 0.983 0.978 0.796 0.058
M4d 0.597 0.047 0.35 0.083 0.845 0.983 0.698 0.041
myprep(eighty)
Balanced Accuracy Precision Recall F1 Specificity Neg Pred Value AUC PR_AUC
M1a 0.632 0.033 0.692 0.064 0.571 0.989 0.623 0.020
M1b 0.536 0.023 1.000 0.044 0.073 1.000 0.535 0.022
M2a 0.500 NA 0.000 NA 1.000 0.979 0.500 0.021
M2b 0.695 0.047 0.692 0.088 0.698 0.991 0.749 0.045
M3a 0.500 0.021 1.000 0.041 0.000 NaN 0.500 0.021
M3b 0.614 0.041 0.462 0.075 0.766 0.985 0.582 0.043
M4a 0.737 0.064 0.692 0.117 0.782 0.992 0.854 0.192
M4b 0.778 0.059 0.846 0.110 0.710 0.995 0.835 0.102
M4c 0.778 0.059 0.846 0.110 0.710 0.995 0.835 0.102
M4d 0.717 0.068 0.615 0.122 0.818 0.990 0.778 0.052
myprep(ninety)
Balanced Accuracy Precision Recall F1 Specificity Neg Pred Value AUC PR_AUC
M1a 0.714 0.044 0.857 0.084 0.571 0.994 0.785 0.039
M1b 0.465 0.021 0.857 0.041 0.073 0.957 0.527 0.172
M2a 0.500 NA 0.000 NA 1.000 0.977 0.500 0.023
M2b 0.660 0.050 0.571 0.092 0.749 0.987 0.765 0.185
M3a 0.500 0.023 1.000 0.044 0.000 NaN 0.500 0.023
M3b 0.549 0.034 0.286 0.061 0.812 0.980 0.541 0.029
M4a 0.780 0.096 0.714 0.169 0.845 0.992 0.880 0.089
M4b 0.674 0.038 0.857 0.072 0.492 0.993 0.790 0.058
M4c 0.674 0.038 0.857 0.072 0.492 0.993 0.790 0.058
M4d 0.635 0.059 0.429 0.103 0.842 0.985 0.775 0.059

Combined CM Plots

grid.arrange(
  M1aplot1, M1aplot2, M1aplot3, M1aplot4, M1aplot5,
  M1bplot1, M1bplot2, M1bplot3, M1bplot4, M1bplot5,
  M2aplot1, M2aplot2, M2aplot3, M2aplot4, M2aplot5,
  M2bplot1, M2bplot2, M2bplot3, M2bplot4, M2bplot5,
  M3aplot1, M3aplot2, M3aplot3, M3aplot4, M3aplot5,
  M3bplot1, M3bplot2, M3bplot3, M3bplot4, M3bplot5,
  M4aplot1, M4aplot2, M4aplot3, M4aplot4, M4aplot5,
  M4bplot1, M4bplot2, M4bplot3, M4bplot4, M4bplot5,
  M4cplot1, M4cplot2, M4cplot3, M4cplot4, M4cplot5,
  M4dplot1, M4dplot2, M4dplot3, M4dplot4, M4dplot5,
             ncol = 5)

Citations

suppressWarnings({
  temp=library()$results[,1]
lapply(temp, citation)})
## [[1]]
## 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")'.
## 
## [[2]]
## To cite package 'acs' in publications use:
## 
##   Glenn E (2019). _acs: Download, Manipulate, and Present American
##   Community Survey and Decennial Data from the US Census_. R package
##   version 2.1.4, <https://CRAN.R-project.org/package=acs>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {acs: Download, Manipulate, and Present American Community Survey and
## Decennial Data from the US Census},
##     author = {Ezra Haber Glenn},
##     year = {2019},
##     note = {R package version 2.1.4},
##     url = {https://CRAN.R-project.org/package=acs},
##   }
## 
## [[3]]
## To cite package 'akima' in publications use:
## 
##   Akima H, Gebhardt A (2022). _akima: Interpolation of Irregularly and
##   Regularly Spaced Data_. R package version 0.6-3.4,
##   <https://CRAN.R-project.org/package=akima>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {akima: Interpolation of Irregularly and Regularly Spaced Data},
##     author = {Hiroshi Akima and Albrecht Gebhardt},
##     year = {2022},
##     note = {R package version 0.6-3.4},
##     url = {https://CRAN.R-project.org/package=akima},
##   }
## 
## [[4]]
## 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},
##   }
## 
## [[5]]
## To cite animation in publications use:
## 
##   Yihui Xie (2013). animation: An R Package for Creating Animations and
##   Demonstrating Statistical Methods. Journal of Statistical Software,
##   53(1), 1-27. URL https://doi.org/10.18637/jss.v053.i01.
## 
##   Yihui Xie [aut, cre], Christian Mueller [ctb], Lijia Yu [ctb],
##   Weicheng Zhu [ctb] (2021). animation: A Gallery of Animations in
##   Statistics and Utilities to Create Animations. R package version 2.7.
## 
## To see these entries in BibTeX format, use 'print(<citation>,
## bibtex=TRUE)', 'toBibtex(.)', or set
## 'options(citation.bibtex.max=999)'.
## 
## [[6]]
## To cite package 'antiword' in publications use:
## 
##   Ooms J (2024). _antiword: Extract Text from Microsoft Word
##   Documents_. R package version 1.3.3,
##   <https://CRAN.R-project.org/package=antiword>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {antiword: Extract Text from Microsoft Word Documents},
##     author = {Jeroen Ooms},
##     year = {2024},
##     note = {R package version 1.3.3},
##     url = {https://CRAN.R-project.org/package=antiword},
##   }
## 
## [[7]]
## 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")'.
## 
## [[8]]
## To cite ape in a publication please use:
## 
##   Paradis E, Schliep K (2019). "ape 5.0: an environment for modern
##   phylogenetics and evolutionary analyses in R." _Bioinformatics_,
##   *35*, 526-528. doi:10.1093/bioinformatics/bty633
##   <https://doi.org/10.1093/bioinformatics/bty633>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Article{,
##     title = {ape 5.0: an environment for modern phylogenetics and evolutionary analyses in {R}},
##     author = {Emmanuel Paradis and Klaus Schliep},
##     journal = {Bioinformatics},
##     year = {2019},
##     volume = {35},
##     pages = {526-528},
##     doi = {10.1093/bioinformatics/bty633},
##   }
## 
## ape is evolving quickly, so you may want to cite its version number
## (found with 'library(help = ape)' or 'packageVersion("ape")').
## 
## [[9]]
## To cite package 'arm' in publications use:
## 
##   Gelman A, Su Y (2024). _arm: Data Analysis Using Regression and
##   Multilevel/Hierarchical Models_. R package version 1.14-4,
##   <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 = {2024},
##     note = {R package version 1.14-4},
##     url = {https://CRAN.R-project.org/package=arm},
##   }
## 
## [[10]]
## To cite package 'arules' in publications use:
## 
##   Hahsler M, Buchta C, Gruen B, Hornik K (2023). _arules: Mining
##   Association Rules and Frequent Itemsets_. R package version 1.7-7,
##   <https://CRAN.R-project.org/package=arules>.
## 
##   Hahsler M, Gruen B, Hornik K (2005). "arules - A Computational
##   Environment for Mining Association Rules and Frequent Item Sets."
##   _Journal of Statistical Software_, *14*(15), 1-25. ISSN 1548-7660,
##   doi:10.18637/jss.v014.i15 <https://doi.org/10.18637/jss.v014.i15>.
## 
##   Hahsler M, Chelluboina S, Hornik K, Buchta C (2011). "The arules
##   R-Package Ecosystem: Analyzing Interesting Patterns from Large
##   Transaction Datasets." _Journal of Machine Learning Research_, *12*,
##   1977-1981. <https://jmlr.csail.mit.edu/papers/v12/hahsler11a.html>.
## 
## To see these entries in BibTeX format, use 'print(<citation>,
## bibtex=TRUE)', 'toBibtex(.)', or set
## 'options(citation.bibtex.max=999)'.
## 
## [[11]]
## To cite package 'arulesViz' in publications use:
## 
##   Hahsler M (2024). _arulesViz: Visualizing Association Rules and
##   Frequent Itemsets_. R package version 1.5.3,
##   <https://CRAN.R-project.org/package=arulesViz>.
## 
##   Hahsler M (2017). "arulesViz: Interactive Visualization of
##   Association Rules with R." _R Journal_, *9*(2), 163-175. ISSN
##   2073-4859, doi:10.32614/RJ-2017-047
##   <https://doi.org/10.32614/RJ-2017-047>,
##   <https://journal.r-project.org/archive/2017/RJ-2017-047/RJ-2017-047.pdf>.
## 
## To see these entries in BibTeX format, use 'print(<citation>,
## bibtex=TRUE)', 'toBibtex(.)', or set
## 'options(citation.bibtex.max=999)'.
## 
## [[12]]
## 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},
##   }
## 
## [[13]]
## 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},
##   }
## 
## [[14]]
## 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},
##   }
## 
## [[15]]
## To cite package 'baguette' in publications use:
## 
##   Kuhn M (2024). _baguette: Efficient Model Functions for Bagging_. R
##   package version 1.0.2, <https://CRAN.R-project.org/package=baguette>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {baguette: Efficient Model Functions for Bagging},
##     author = {Max Kuhn},
##     year = {2024},
##     note = {R package version 1.0.2},
##     url = {https://CRAN.R-project.org/package=baguette},
##   }
## 
## [[16]]
## To cite package 'bain' in publications use:
## 
##   Gu X, Hoijtink H, Mulder J, van Lissa CJ (2023). _bain: Bayes Factors
##   for Informative Hypotheses_. R package version 0.2.10,
##   <https://CRAN.R-project.org/package=bain>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {bain: Bayes Factors for Informative Hypotheses},
##     author = {Xin Gu and Herbert Hoijtink and Joris Mulder and Caspar J {van Lissa}},
##     year = {2023},
##     note = {R package version 0.2.10},
##     url = {https://CRAN.R-project.org/package=bain},
##   }
## 
## [[17]]
## 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")'.
## 
## [[18]]
## To cite the bayesplot R package:
## 
##   Gabry J, Mahr T (2024). "bayesplot: Plotting for Bayesian Models." R
##   package version 1.11.1, <https://mc-stan.org/bayesplot/>.
## 
## To cite the bayesplot paper 'Visualization in Bayesian workflow':
## 
##   Gabry J, Simpson D, Vehtari A, Betancourt M, Gelman A (2019).
##   "Visualization in Bayesian workflow." _J. R. Stat. Soc. A_, *182*,
##   389-402. doi:10.1111/rssa.12378 <https://doi.org/10.1111/rssa.12378>.
## 
## To see these entries in BibTeX format, use 'print(<citation>,
## bibtex=TRUE)', 'toBibtex(.)', or set
## 'options(citation.bibtex.max=999)'.
## 
## [[19]]
## 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},
##   }
## 
## [[20]]
## 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},
##   }
## 
## [[21]]
## 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},
##   }
## 
## [[22]]
## To cite package 'BH' in publications use:
## 
##   Eddelbuettel D, Emerson JW, Kane MJ (2024). _BH: Boost C++ Header
##   Files_. R package version 1.84.0-0,
##   <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 = {2024},
##     note = {R package version 1.84.0-0},
##     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")'.
## 
## [[23]]
## 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},
##   }
## 
## [[24]]
## To cite package 'BiocManager' in publications use:
## 
##   Morgan M, Ramos M (2024). _BiocManager: Access the Bioconductor
##   Project Package Repository_. R package version 1.30.23,
##   <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 and Marcel Ramos},
##     year = {2024},
##     note = {R package version 1.30.23},
##     url = {https://CRAN.R-project.org/package=BiocManager},
##   }
## 
## [[25]]
## To cite package 'BiocVersion' in publications use:
## 
##   Morgan M (2023). _BiocVersion: Set the appropriate version of
##   Bioconductor packages_. doi:10.18129/B9.bioc.BiocVersion
##   <https://doi.org/10.18129/B9.bioc.BiocVersion>, R package version
##   3.18.1, <https://bioconductor.org/packages/BiocVersion>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {BiocVersion: Set the appropriate version of Bioconductor packages},
##     author = {Martin Morgan},
##     year = {2023},
##     note = {R package version 3.18.1},
##     url = {https://bioconductor.org/packages/BiocVersion},
##     doi = {10.18129/B9.bioc.BiocVersion},
##   }
## 
## [[26]]
## 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")'.
## 
## [[27]]
## 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")'.
## 
## [[28]]
## 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")'.
## 
## [[29]]
## There are two publications about blavaan, one describing the Stan
## methods and one describing the JAGS methods.
## 
## If you use Stan, please cite:
## 
##   Merkle EC, Fitzsimmons E, Uanhoro J, Goodrich B (2021). "Efficient
##   Bayesian Structural Equation Modeling in Stan." _Journal of
##   Statistical Software_, *100*(6), 1-22. doi:10.18637/jss.v100.i06
##   <https://doi.org/10.18637/jss.v100.i06>.
## 
## If you use target='jags', please cite:
## 
##   Merkle EC, Rosseel Y (2018). "blavaan: Bayesian Structural Equation
##   Models via Parameter Expansion." _Journal of Statistical Software_,
##   *85*(4), 1-30. doi:10.18637/jss.v085.i04
##   <https://doi.org/10.18637/jss.v085.i04>.
## 
## To see these entries in BibTeX format, use 'print(<citation>,
## bibtex=TRUE)', 'toBibtex(.)', or set
## 'options(citation.bibtex.max=999)'.
## 
## [[30]]
## To cite package 'blob' in publications use:
## 
##   Wickham H (2023). _blob: A Simple S3 Class for Representing Vectors
##   of Binary Data ('BLOBS')_. R package version 1.2.4,
##   <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 = {2023},
##     note = {R package version 1.2.4},
##     url = {https://CRAN.R-project.org/package=blob},
##   }
## 
## [[31]]
## To cite package 'bmp' in publications use:
## 
##   Jefferis G (2017). _bmp: Read Windows Bitmap (BMP) Images_. R package
##   version 0.3, <https://CRAN.R-project.org/package=bmp>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {bmp: Read Windows Bitmap (BMP) Images},
##     author = {Gregory Jefferis},
##     year = {2017},
##     note = {R package version 0.3},
##     url = {https://CRAN.R-project.org/package=bmp},
##   }
## 
## ATTENTION: This citation information has been auto-generated from the
## package DESCRIPTION file and may need manual editing, see
## 'help("citation")'.
## 
## [[32]]
## 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)'.
## 
## [[33]]
## To cite package 'brio' in publications use:
## 
##   Hester J, Csárdi G (2024). _brio: Basic R Input Output_. R package
##   version 1.1.5, <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 = {2024},
##     note = {R package version 1.1.5},
##     url = {https://CRAN.R-project.org/package=brio},
##   }
## 
## [[34]]
## To cite package 'broom' in publications use:
## 
##   Robinson D, Hayes A, Couch S (2024). _broom: Convert Statistical
##   Objects into Tidy Tibbles_. R package version 1.0.6,
##   <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 = {2024},
##     note = {R package version 1.0.6},
##     url = {https://CRAN.R-project.org/package=broom},
##   }
## 
## [[35]]
## To cite package 'broom.helpers' in publications use:
## 
##   Larmarange J, Sjoberg D (2024). _broom.helpers: Helpers for Model
##   Coefficients Tibbles_. R package version 1.15.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 = {2024},
##     note = {R package version 1.15.0},
##     url = {https://CRAN.R-project.org/package=broom.helpers},
##   }
## 
## [[36]]
## To cite package 'bslib' in publications use:
## 
##   Sievert C, Cheng J, Aden-Buie G (2024). _bslib: Custom 'Bootstrap'
##   'Sass' Themes for 'shiny' and 'rmarkdown'_. R package version 0.7.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 = {2024},
##     note = {R package version 0.7.0},
##     url = {https://CRAN.R-project.org/package=bslib},
##   }
## 
## [[37]]
## To cite package 'butcher' in publications use:
## 
##   Cahoon J, Vaughan D, Kuhn M, Hayes A, Silge J (2024). _butcher: Model
##   Butcher_. R package version 0.3.4,
##   <https://CRAN.R-project.org/package=butcher>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {butcher: Model Butcher},
##     author = {Joyce Cahoon and Davis Vaughan and Max Kuhn and Alex Hayes and Julia Silge},
##     year = {2024},
##     note = {R package version 0.3.4},
##     url = {https://CRAN.R-project.org/package=butcher},
##   }
## 
## [[38]]
## 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},
##   }
## 
## [[39]]
## To cite the package 'ca' in publications please use:
## 
##   Nenadic, O., Greenacre, M. (2007) Correspondence Analysis in R, with
##   two- and three-dimensional graphics: The ca package. Journal of
##   Statistical Software 20(3):1-13.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Article{,
##     title = {Correspondence Analysis in R, with two- and three-dimensional graphics: The ca package},
##     journal = {Journal of Statistical Software},
##     volume = {20},
##     number = {3},
##     pages = {1-13},
##     year = {2007},
##     author = {O. Nenadic and M. Greenacre},
##     url = {http://www.jstatsoft.org},
##   }
## 
## [[40]]
## To cite package 'cachem' in publications use:
## 
##   Chang W (2024). _cachem: Cache R Objects with Automatic Pruning_. R
##   package version 1.1.0, <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 = {2024},
##     note = {R package version 1.1.0},
##     url = {https://CRAN.R-project.org/package=cachem},
##   }
## 
## [[41]]
## To cite calculus in publications use:
## 
##   Guidotti E (2022). "calculus: High-Dimensional Numerical and Symbolic
##   Calculus in R." _Journal of Statistical Software_, *104*(5), 1-37.
##   doi:10.18637/jss.v104.i05 <https://doi.org/10.18637/jss.v104.i05>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Article{,
##     title = {{calculus}: High-Dimensional Numerical and Symbolic Calculus in {R}},
##     author = {Emanuele Guidotti},
##     journal = {Journal of Statistical Software},
##     year = {2022},
##     volume = {104},
##     number = {5},
##     pages = {1--37},
##     doi = {10.18637/jss.v104.i05},
##   }
## 
## [[42]]
## To cite package 'callr' in publications use:
## 
##   Csárdi G, Chang W (2024). _callr: Call R from R_. R package version
##   3.7.6, <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 = {2024},
##     note = {R package version 3.7.6},
##     url = {https://CRAN.R-project.org/package=callr},
##   }
## 
## [[43]]
## 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/},
##   }
## 
## [[44]]
## 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},
##   }
## 
## [[45]]
## 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},
##   }
## 
## [[46]]
## 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")'.
## 
## [[47]]
## To cite package 'cccd' in publications use:
## 
##   Marchette DJ (2022). _cccd: Class Cover Catch Digraphs_. R package
##   version 1.6, <https://CRAN.R-project.org/package=cccd>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {cccd: Class Cover Catch Digraphs},
##     author = {David J. Marchette},
##     year = {2022},
##     note = {R package version 1.6},
##     url = {https://CRAN.R-project.org/package=cccd},
##   }
## 
## ATTENTION: This citation information has been auto-generated from the
## package DESCRIPTION file and may need manual editing, see
## 'help("citation")'.
## 
## [[48]]
## 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},
##   }
## 
## [[49]]
## 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},
##   }
## 
## [[50]]
## To cite package 'choroplethr' in publications use:
## 
##   Lamstein A (2024). _choroplethr: Simplify the Creation of Choropleth
##   Maps in R_. R package version 3.7.3,
##   <https://CRAN.R-project.org/package=choroplethr>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {choroplethr: Simplify the Creation of Choropleth Maps in R},
##     author = {Ari Lamstein},
##     year = {2024},
##     note = {R package version 3.7.3},
##     url = {https://CRAN.R-project.org/package=choroplethr},
##   }
## 
## [[51]]
## To cite package 'classInt' in publications use:
## 
##   Bivand R (2023). _classInt: Choose Univariate Class Intervals_. R
##   package version 0.4-10,
##   <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 = {2023},
##     note = {R package version 0.4-10},
##     url = {https://CRAN.R-project.org/package=classInt},
##   }
## 
## [[52]]
## 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},
##   }
## 
## [[53]]
## 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},
##   }
## 
## [[54]]
## To cite package 'clock' in publications use:
## 
##   Vaughan D (2023). _clock: Date-Time Types and Tools_. R package
##   version 0.7.0, <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 = {2023},
##     note = {R package version 0.7.0},
##     url = {https://CRAN.R-project.org/package=clock},
##   }
## 
## [[55]]
## To cite package 'clue' in publications use:
## 
##   Hornik K (2023). _clue: Cluster Ensembles_. R package version 0.3-65,
##   <https://CRAN.R-project.org/package=clue>.
## 
##   Hornik K (2005). "A CLUE for CLUster Ensembles." _Journal of
##   Statistical Software_, *14*(12). doi:10.18637/jss.v014.i12
##   <https://doi.org/10.18637/jss.v014.i12>.
## 
## To see these entries in BibTeX format, use 'print(<citation>,
## bibtex=TRUE)', 'toBibtex(.)', or set
## 'options(citation.bibtex.max=999)'.
## 
## [[56]]
## To cite the R package cluster in publications use:
## 
##   Maechler, M., Rousseeuw, P., Struyf, A., Hubert, M., Hornik,
##   K.(2023).  cluster: Cluster Analysis Basics and Extensions. R package
##   version 2.1.6.
## 
## 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 = {2023},
##     url = {https://CRAN.R-project.org/package=cluster},
##     note = {R package version 2.1.6 --- For new features, see the 'NEWS' and the 'Changelog' file in the package source)},
##   }
## 
## [[57]]
## 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},
##   }
## 
## [[58]]
## 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)'.
## 
## [[59]]
## 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)'.
## 
## [[60]]
## To cite package 'colourpicker' in publications use:
## 
##   Attali D (2023). _colourpicker: A Colour Picker Tool for Shiny and
##   for Selecting Colours in Plots_. R package version 1.3.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 = {2023},
##     note = {R package version 1.3.0},
##     url = {https://CRAN.R-project.org/package=colourpicker},
##   }
## 
## [[61]]
## To cite package 'commonmark' in publications use:
## 
##   Ooms J (2024). _commonmark: High Performance CommonMark and Github
##   Markdown Rendering in R_. R package version 1.9.1,
##   <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 = {2024},
##     note = {R package version 1.9.1},
##     url = {https://CRAN.R-project.org/package=commonmark},
##   }
## 
## [[62]]
## 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},
##   }
## 
## [[63]]
## To cite package 'config' in publications use:
## 
##   Allaire J (2023). _config: Manage Environment Specific Configuration
##   Values_. R package version 0.3.2,
##   <https://CRAN.R-project.org/package=config>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {config: Manage Environment Specific Configuration Values},
##     author = {JJ Allaire},
##     year = {2023},
##     note = {R package version 0.3.2},
##     url = {https://CRAN.R-project.org/package=config},
##   }
## 
## [[64]]
## 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},
##   }
## 
## [[65]]
## 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")'.
## 
## [[66]]
## 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},
##   }
## 
## [[67]]
## To cite package 'cowplot' in publications use:
## 
##   Wilke C (2024). _cowplot: Streamlined Plot Theme and Plot Annotations
##   for 'ggplot2'_. R package version 1.1.3,
##   <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 = {2024},
##     note = {R package version 1.1.3},
##     url = {https://CRAN.R-project.org/package=cowplot},
##   }
## 
## [[68]]
## 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.7,
##   <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.7},
##     url = {https://CRAN.R-project.org/package=cpp11},
##   }
## 
## [[69]]
## 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},
##   }
## 
## [[70]]
## To cite package 'crosstalk' in publications use:
## 
##   Cheng J, Sievert C (2023). _crosstalk: Inter-Widget Interactivity for
##   HTML Widgets_. R package version 1.2.1,
##   <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 = {2023},
##     note = {R package version 1.2.1},
##     url = {https://CRAN.R-project.org/package=crosstalk},
##   }
## 
## [[71]]
## To cite package 'crul' in publications use:
## 
##   Chamberlain S (2024). _crul: HTTP Client_. R package version 1.4.2,
##   <https://CRAN.R-project.org/package=crul>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {crul: HTTP Client},
##     author = {Scott Chamberlain},
##     year = {2024},
##     note = {R package version 1.4.2},
##     url = {https://CRAN.R-project.org/package=crul},
##   }
## 
## [[72]]
## 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},
##   }
## 
## [[73]]
## To cite package 'Cubist' in publications use:
## 
##   Kuhn M, Quinlan R (2023). _Cubist: Rule- And Instance-Based
##   Regression Modeling_. R package version 0.4.2.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 = {2023},
##     note = {R package version 0.4.2.1},
##     url = {https://CRAN.R-project.org/package=Cubist},
##   }
## 
## [[74]]
## To cite package 'curl' in publications use:
## 
##   Ooms J (2024). _curl: A Modern and Flexible Web Client for R_. R
##   package version 5.2.1, <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 = {2024},
##     note = {R package version 5.2.1},
##     url = {https://CRAN.R-project.org/package=curl},
##   }
## 
## [[75]]
## To cite package 'data.table' in publications use:
## 
##   Dowle M, Srinivasan A (2023). _data.table: Extension of
##   `data.frame`_. R package version 1.14.8,
##   <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 = {2023},
##     note = {R package version 1.14.8},
##     url = {https://CRAN.R-project.org/package=data.table},
##   }
## 
## [[76]]
## To cite package 'data.tree' in publications use:
## 
##   Glur C (2023). _data.tree: General Purpose Hierarchical Data
##   Structure_. R package version 1.1.0,
##   <https://CRAN.R-project.org/package=data.tree>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {data.tree: General Purpose Hierarchical Data Structure},
##     author = {Christoph Glur},
##     year = {2023},
##     note = {R package version 1.1.0},
##     url = {https://CRAN.R-project.org/package=data.tree},
##   }
## 
## [[77]]
## To cite package 'DataExplorer' in publications use:
## 
##   Cui B (2024). _DataExplorer: Automate Data Exploration and
##   Treatment_. R package version 0.8.3,
##   <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 = {2024},
##     note = {R package version 0.8.3},
##     url = {https://CRAN.R-project.org/package=DataExplorer},
##   }
## 
## [[78]]
## 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},
##   }
## 
## [[79]]
## To cite package 'DBI' in publications use:
## 
##   R Special Interest Group on Databases (R-SIG-DB), Wickham H, Müller K
##   (2024). _DBI: R Database Interface_. R package version 1.2.2,
##   <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 = {2024},
##     note = {R package version 1.2.2},
##     url = {https://CRAN.R-project.org/package=DBI},
##   }
## 
## [[80]]
## To cite package 'dbplyr' in publications use:
## 
##   Wickham H, Girlich M, Ruiz E (2024). _dbplyr: A 'dplyr' Back End for
##   Databases_. R package version 2.5.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 = {2024},
##     note = {R package version 2.5.0},
##     url = {https://CRAN.R-project.org/package=dbplyr},
##   }
## 
## [[81]]
## Hahsler M, Piekenbrock M (2023). _dbscan: Density-Based Spatial
## Clustering of Applications with Noise (DBSCAN) and Related Algorithms_.
## R package version 1.1-12, <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)'.
## 
## [[82]]
## To cite package 'deldir' in publications use:
## 
##   Turner R (2024). _deldir: Delaunay Triangulation and Dirichlet
##   (Voronoi) Tessellation_. R package version 2.0-4,
##   <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 = {2024},
##     note = {R package version 2.0-4},
##     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")'.
## 
## [[83]]
## 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.
## 
## [[84]]
## To cite package 'DEoptimR' in publications use:
## 
##   Conceicao EL (2023). _DEoptimR: Differential Evolution Optimization
##   in Pure R_. R package version 1.1-3,
##   <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 = {2023},
##     note = {R package version 1.1-3},
##     url = {https://CRAN.R-project.org/package=DEoptimR},
##   }
## 
## [[85]]
## 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},
##   }
## 
## [[86]]
## To cite package 'desc' in publications use:
## 
##   Csárdi G, Müller K, Hester J (2023). _desc: Manipulate DESCRIPTION
##   Files_. R package version 1.4.3,
##   <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 = {2023},
##     note = {R package version 1.4.3},
##     url = {https://CRAN.R-project.org/package=desc},
##   }
## 
## [[87]]
## To cite package 'DescTools' in publications use:
## 
##   Signorell A (2024). _DescTools: Tools for Descriptive Statistics_. R
##   package version 0.99.54,
##   <https://CRAN.R-project.org/package=DescTools>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {DescTools: Tools for Descriptive Statistics},
##     author = {Andri Signorell},
##     year = {2024},
##     note = {R package version 0.99.54},
##     url = {https://CRAN.R-project.org/package=DescTools},
##   }
## 
## [[88]]
## To cite package 'deSolve' in publications use:
## 
##   Karline Soetaert, Thomas Petzoldt, R. Woodrow Setzer (2010). Solving
##   Differential Equations in R: Package deSolve. Journal of Statistical
##   Software, 33(9), 1--25. doi:10.18637/jss.v033.i09
## 
## A BibTeX entry for LaTeX users is
## 
##   @Article{,
##     title = {Solving Differential Equations in {R}: Package de{S}olve},
##     author = {{Karline Soetaert} and {Thomas Petzoldt} and {R. Woodrow Setzer}},
##     journal = {Journal of Statistical Software},
##     volume = {33},
##     number = {9},
##     pages = {1--25},
##     year = {2010},
##     doi = {10.18637/jss.v033.i09},
##     keywords = {ordinary differential equations, partial differential
##     equations, differential algebraic equations, initial value problems,
##     R, FORTRAN, C},
##   }
## 
## [[89]]
## To cite package 'detectseparation' in publications use:
## 
##   Kosmidis I, Schumacher D, Schwendinger F (2022). _detectseparation:
##   Detect and Check for Separation and Infinite Maximum Likelihood
##   Estimates_. R package version 0.3,
##   <https://CRAN.R-project.org/package=detectseparation>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {detectseparation: Detect and Check for Separation and Infinite Maximum Likelihood
## Estimates},
##     author = {Ioannis Kosmidis and Dirk Schumacher and Florian Schwendinger},
##     year = {2022},
##     note = {R package version 0.3},
##     url = {https://CRAN.R-project.org/package=detectseparation},
##   }
## 
## [[90]]
## To cite package 'diagram' in publications use:
## 
##   Soetaert K (2020). _diagram: Functions for Visualising Simple Graphs
##   (Networks), Plotting Flow Diagrams_. R package version 1.6.5,
##   <https://CRAN.R-project.org/package=diagram>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {diagram: Functions for Visualising Simple Graphs (Networks), Plotting
## Flow Diagrams},
##     author = {Karline Soetaert},
##     year = {2020},
##     note = {R package version 1.6.5},
##     url = {https://CRAN.R-project.org/package=diagram},
##   }
## 
## ATTENTION: This citation information has been auto-generated from the
## package DESCRIPTION file and may need manual editing, see
## 'help("citation")'.
## 
## [[91]]
## To cite package 'DiagrammeR' in publications use:
## 
##   Iannone R, Roy O (2024). _DiagrammeR: Graph/Network Visualization_. R
##   package version 1.0.11,
##   <https://CRAN.R-project.org/package=DiagrammeR>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {DiagrammeR: Graph/Network Visualization},
##     author = {Richard Iannone and Olivier Roy},
##     year = {2024},
##     note = {R package version 1.0.11},
##     url = {https://CRAN.R-project.org/package=DiagrammeR},
##   }
## 
## [[92]]
## To cite package 'dials' in publications use:
## 
##   Kuhn M, Frick H (2024). _dials: Tools for Creating Tuning Parameter
##   Values_. R package version 1.2.1,
##   <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 = {2024},
##     note = {R package version 1.2.1},
##     url = {https://CRAN.R-project.org/package=dials},
##   }
## 
## [[93]]
## 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/},
##   }
## 
## [[94]]
## 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},
##   }
## 
## [[95]]
## 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},
##   }
## 
## [[96]]
## 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")'.
## 
## [[97]]
## To cite package 'distributional' in publications use:
## 
##   O'Hara-Wild M, Kay M, Hayes A (2024). _distributional: Vectorised
##   Probability Distributions_. R package version 0.4.0,
##   <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 = {2024},
##     note = {R package version 0.4.0},
##     url = {https://CRAN.R-project.org/package=distributional},
##   }
## 
## [[98]]
## 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},
##   }
## 
## [[99]]
## 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},
##   }
## 
## [[100]]
## 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")'.
## 
## [[101]]
## 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},
##   }
## 
## [[102]]
## To cite package 'DT' in publications use:
## 
##   Xie Y, Cheng J, Tan X (2024). _DT: A Wrapper of the JavaScript
##   Library 'DataTables'_. R package version 0.33,
##   <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 = {2024},
##     note = {R package version 0.33},
##     url = {https://CRAN.R-project.org/package=DT},
##   }
## 
## [[103]]
## To cite package 'dtplyr' in publications use:
## 
##   Wickham H, Girlich M, Fairbanks M, Dickerson R (2023). _dtplyr: Data
##   Table Back-End for 'dplyr'_. R package version 1.3.1,
##   <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 = {2023},
##     note = {R package version 1.3.1},
##     url = {https://CRAN.R-project.org/package=dtplyr},
##   }
## 
## [[104]]
## 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},
##   }
## 
## [[105]]
## To cite package 'earth' in publications use:
## 
##   Hastie SMDfmbT, wrapper. RTUAMFuwTLl (2024). _earth: Multivariate
##   Adaptive Regression Splines_. R package version 5.3.3,
##   <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 = {2024},
##     note = {R package version 5.3.3},
##     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")'.
## 
## [[106]]
## 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},
##   }
## 
## [[107]]
## To cite package 'eia' in publications use:
## 
##   Leonawicz M, Hoff M (2024). _eia: API Wrapper for U.S. Energy
##   Information Administration ('EIA') Open Data_. R package version
##   0.4.2, <https://CRAN.R-project.org/package=eia>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {eia: API Wrapper for U.S. Energy Information Administration ('EIA')
## Open Data},
##     author = {Matthew Leonawicz and Matthew Hoff},
##     year = {2024},
##     note = {R package version 0.4.2},
##     url = {https://CRAN.R-project.org/package=eia},
##   }
## 
## [[108]]
## To cite package 'ellipse' in publications use:
## 
##   Murdoch D, Chow ED (2023). _ellipse: Functions for Drawing Ellipses
##   and Ellipse-Like Confidence Regions_. R package version 0.5.0,
##   <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 = {2023},
##     note = {R package version 0.5.0},
##     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")'.
## 
## [[109]]
## 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},
##   }
## 
## [[110]]
## 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},
##   }
## 
## [[111]]
## To cite package 'emmeans' in publications use:
## 
##   Lenth R (2024). _emmeans: Estimated Marginal Means, aka Least-Squares
##   Means_. R package version 1.10.2,
##   <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 = {2024},
##     note = {R package version 1.10.2},
##     url = {https://CRAN.R-project.org/package=emmeans},
##   }
## 
## [[112]]
## 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},
##   }
## 
## [[113]]
## To cite package 'estimability' in publications use:
## 
##   Lenth R (2024). _estimability: Tools for Assessing Estimability of
##   Linear Predictions_. R package version 1.5.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 = {2024},
##     note = {R package version 1.5.1},
##     url = {https://CRAN.R-project.org/package=estimability},
##   }
## 
## [[114]]
## 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},
##   }
## 
## [[115]]
## To cite package 'Exact' in publications use:
## 
##   Calhoun P (2022). _Exact: Unconditional Exact Test_. R package
##   version 3.2, <https://CRAN.R-project.org/package=Exact>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {Exact: Unconditional Exact Test},
##     author = {Peter Calhoun},
##     year = {2022},
##     note = {R package version 3.2},
##     url = {https://CRAN.R-project.org/package=Exact},
##   }
## 
## [[116]]
## To cite package 'expm' in publications use:
## 
##   Maechler M, Dutang C, Goulet V (2024). _expm: Matrix Exponential,
##   Log, 'etc'_. R package version 0.999-9,
##   <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 = {2024},
##     note = {R package version 0.999-9},
##     url = {https://CRAN.R-project.org/package=expm},
##   }
## 
## [[117]]
## To cite package 'fable' in publications use:
## 
##   O'Hara-Wild M, Hyndman R, Wang E (2023). _fable: Forecasting Models
##   for Tidy Time Series_. R package version 0.3.3,
##   <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 = {2023},
##     note = {R package version 0.3.3},
##     url = {https://CRAN.R-project.org/package=fable},
##   }
## 
## [[118]]
## To cite package 'fabletools' in publications use:
## 
##   O'Hara-Wild M, Hyndman R, Wang E (2024). _fabletools: Core Tools for
##   Packages in the 'fable' Framework_. R package version 0.4.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 = {2024},
##     note = {R package version 0.4.2},
##     url = {https://CRAN.R-project.org/package=fabletools},
##   }
## 
## [[119]]
## 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},
##   }
## 
## [[120]]
## 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},
##   }
## 
## [[121]]
## 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},
##   }
## 
## [[122]]
## 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},
##   }
## 
## [[123]]
## To cite package 'fastDummies' in publications use:
## 
##   Kaplan J (2023). _fastDummies: Fast Creation of Dummy (Binary)
##   Columns and Rows from Categorical Variables_. R package version
##   1.7.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 = {2023},
##     note = {R package version 1.7.3},
##     url = {https://CRAN.R-project.org/package=fastDummies},
##   }
## 
## [[124]]
## To cite package 'fastGraph' in publications use:
## 
##   Garren ST (2019). _fastGraph: Fast Drawing and Shading of Graphs of
##   Statistical Distributions_. R package version 2.1,
##   <https://CRAN.R-project.org/package=fastGraph>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {fastGraph: Fast Drawing and Shading of Graphs of Statistical Distributions},
##     author = {Steven T. Garren},
##     year = {2019},
##     note = {R package version 2.1},
##     url = {https://CRAN.R-project.org/package=fastGraph},
##   }
## 
## ATTENTION: This citation information has been auto-generated from the
## package DESCRIPTION file and may need manual editing, see
## 'help("citation")'.
## 
## [[125]]
## To cite package 'fastmap' in publications use:
## 
##   Chang W (2024). _fastmap: Fast Data Structures_. R package version
##   1.2.0, <https://CRAN.R-project.org/package=fastmap>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {fastmap: Fast Data Structures},
##     author = {Winston Chang},
##     year = {2024},
##     note = {R package version 1.2.0},
##     url = {https://CRAN.R-project.org/package=fastmap},
##   }
## 
## [[126]]
## To cite package 'fdm2id' in publications use:
## 
##   Blansché A (2023). _fdm2id: Data Mining and R Programming for
##   Beginners_. R package version 0.9.9,
##   <https://CRAN.R-project.org/package=fdm2id>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {fdm2id: Data Mining and R Programming for Beginners},
##     author = {Alexandre Blansché},
##     year = {2023},
##     note = {R package version 0.9.9},
##     url = {https://CRAN.R-project.org/package=fdm2id},
##   }
## 
## [[127]]
## 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")'.
## 
## [[128]]
## To cite package 'feasts' in publications use:
## 
##   O'Hara-Wild M, Hyndman R, Wang E (2024). _feasts: Feature Extraction
##   and Statistics for Time Series_. R package version 0.3.2,
##   <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 = {2024},
##     note = {R package version 0.3.2},
##     url = {https://CRAN.R-project.org/package=feasts},
##   }
## 
## [[129]]
## To cite package 'fim4r' in publications use:
## 
##   Borgelt C (2022). _fim4r: Frequent Item Set Mining for R_. R package
##   version 1.8, <http://www.borgelt.net/fim4r.html>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {fim4r: Frequent Item Set Mining for R},
##     author = {Christian Borgelt},
##     year = {2022},
##     note = {R package version 1.8},
##     url = {http://www.borgelt.net/fim4r.html},
##   }
## 
## [[130]]
## To cite fitdistrplus in publications use:
## 
##   Marie Laure Delignette-Muller, Christophe Dutang (2015).
##   fitdistrplus: An R Package for Fitting Distributions. Journal of
##   Statistical Software, 64(4), 1-34. DOI 10.18637/jss.v064.i04.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Article{,
##     title = {{fitdistrplus}: An {R} Package for Fitting Distributions},
##     author = {Marie Laure Delignette-Muller and Christophe Dutang},
##     journal = {Journal of Statistical Software},
##     year = {2015},
##     volume = {64},
##     number = {4},
##     pages = {1--34},
##     doi = {10.18637/jss.v064.i04},
##   }
## 
## Please cite both the package and R when using them for data analysis.
## See also 'citation()' for citing R.
## 
## [[131]]
## 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/},
##   }
## 
## [[132]]
## To cite package flexclust in publications use:
## 
##   Leisch F (2006). "A Toolbox for K-Centroids Cluster Analysis."
##   _Computational Statistics and Data Analysis_, *51*(2), 526-544.
##   doi:10.1016/j.csda.2005.10.006
##   <https://doi.org/10.1016/j.csda.2005.10.006>.
## 
## Visualization methods are explained in:
## 
##   Leisch F (2010). "Neighborhood Graphs, Stripes and Shadow Plots for
##   Cluster Visualization." _Statistics and Computing_, *20*, 457-469.
##   doi:10.1007/s11222-009-9137-8
##   <https://doi.org/10.1007/s11222-009-9137-8>.
## 
## Group constraints are explained in:
## 
##   Leisch F, Grün B (2006). "Extending Standard Cluster Algorithms to
##   Allow for Group Constraints." In Rizzi A, Vichi M (eds.), _Compstat
##   2006-Proceedings in Computational Statistics_, 885-892. ISBN
##   3-7908-1708-2.
## 
## Function qtclust() is explained in:
## 
##   Scharl T, Leisch F (2006). "The Stochastic QT-clust Algorithm:
##   Evaluation of Stability and Variance on Time-course Microarray Data."
##   In Rizzi A, Vichi M (eds.), _Compstat 2006-Proceedings in
##   Computational Statistics_, 1015-1022. ISBN 3-7908-1708-2.
## 
## Using flexclust for market segmentation is explained in:
## 
##   Dolnicar S, Grün B, Leisch F (2018). _Market Segmentation
##   Analysis-Understanding It, Doing It, and Making It Useful_. Springer,
##   Singapore. doi:10.1007/978-981-10-8818-6
##   <https://doi.org/10.1007/978-981-10-8818-6>.
## 
## To see these entries in BibTeX format, use 'print(<citation>,
## bibtex=TRUE)', 'toBibtex(.)', or set
## 'options(citation.bibtex.max=999)'.
## 
## [[133]]
## To cite package 'flextable' in publications use:
## 
##   Gohel D, Skintzos P (2024). _flextable: Functions for Tabular
##   Reporting_. R package version 0.9.6,
##   <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 = {2024},
##     note = {R package version 0.9.6},
##     url = {https://CRAN.R-project.org/package=flextable},
##   }
## 
## [[134]]
## To cite package 'fmsb' in publications use:
## 
##   Nakazawa M (2024). _fmsb: Functions for Medical Statistics Book with
##   some Demographic Data_. R package version 0.7.6,
##   <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 = {2024},
##     note = {R package version 0.7.6},
##     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")'.
## 
## [[135]]
## To cite package 'FNN' in publications use:
## 
##   Beygelzimer A, Kakadet S, Langford J, Arya S, Mount D, Li S (2024).
##   _FNN: Fast Nearest Neighbor Search Algorithms and Applications_. R
##   package version 1.1.4, <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 = {2024},
##     note = {R package version 1.1.4},
##     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")'.
## 
## [[136]]
## To cite package 'fontawesome' in publications use:
## 
##   Iannone R (2023). _fontawesome: Easily Work with 'Font Awesome'
##   Icons_. R package version 0.5.2,
##   <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.2},
##     url = {https://CRAN.R-project.org/package=fontawesome},
##   }
## 
## [[137]]
## To cite package 'fontBitstreamVera' in publications use:
## 
##   Henry L (2017). _fontBitstreamVera: Fonts with 'Bitstream Vera Fonts'
##   License_. R package version 0.1.1,
##   <https://CRAN.R-project.org/package=fontBitstreamVera>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {fontBitstreamVera: Fonts with 'Bitstream Vera Fonts' License},
##     author = {Lionel Henry},
##     year = {2017},
##     note = {R package version 0.1.1},
##     url = {https://CRAN.R-project.org/package=fontBitstreamVera},
##   }
## 
## [[138]]
## To cite package 'fontLiberation' in publications use:
## 
##   Pravin Satpute, Steve Matteson (2016). _fontLiberation: Liberation
##   Fonts_. R package version 0.1.0,
##   <https://CRAN.R-project.org/package=fontLiberation>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {fontLiberation: Liberation Fonts},
##     author = {{Pravin Satpute} and {Steve Matteson}},
##     year = {2016},
##     note = {R package version 0.1.0},
##     url = {https://CRAN.R-project.org/package=fontLiberation},
##   }
## 
## [[139]]
## To cite package 'fontquiver' in publications use:
## 
##   Henry L (2017). _fontquiver: Set of Installed Fonts_. R package
##   version 0.2.1, <https://CRAN.R-project.org/package=fontquiver>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {fontquiver: Set of Installed Fonts},
##     author = {Lionel Henry},
##     year = {2017},
##     note = {R package version 0.2.1},
##     url = {https://CRAN.R-project.org/package=fontquiver},
##   }
## 
## [[140]]
## 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},
##   }
## 
## [[141]]
## 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},
##   }
## 
## [[142]]
## 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 (2024).
##   _forecast: Forecasting functions for time series and linear models_.
##   R package version 8.22.0, <https://pkg.robjhyndman.com/forecast/>.
## 
##   Hyndman RJ, Khandakar Y (2008). "Automatic time series forecasting:
##   the forecast package for R." _Journal of Statistical Software_,
##   *27*(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)'.
## 
## [[143]]
## To cite package 'foreign' in publications use:
## 
##   R Core Team (2023). _foreign: Read Data Stored by 'Minitab', 'S',
##   'SAS', 'SPSS', 'Stata', 'Systat', 'Weka', 'dBase', ..._. R package
##   version 0.8-86, <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 = {2023},
##     note = {R package version 0.8-86},
##     url = {https://CRAN.R-project.org/package=foreign},
##   }
## 
## [[144]]
## To cite package 'formattable' in publications use:
## 
##   Ren K, Russell K (2021). _formattable: Create 'Formattable' Data
##   Structures_. R package version 0.2.1,
##   <https://CRAN.R-project.org/package=formattable>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {formattable: Create 'Formattable' Data Structures},
##     author = {Kun Ren and Kenton Russell},
##     year = {2021},
##     note = {R package version 0.2.1},
##     url = {https://CRAN.R-project.org/package=formattable},
##   }
## 
## [[145]]
## 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},
##   }
## 
## [[146]]
## To cite package 'formula.tools' in publications use:
## 
##   Brown C (2018). _formula.tools: Programmatic Utilities for
##   Manipulating Formulas, Expressions, Calls, Assignments and Other R
##   Objects_. R package version 1.7.1,
##   <https://CRAN.R-project.org/package=formula.tools>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {formula.tools: Programmatic Utilities for Manipulating Formulas, Expressions,
## Calls, Assignments and Other R Objects},
##     author = {Christopher Brown},
##     year = {2018},
##     note = {R package version 1.7.1},
##     url = {https://CRAN.R-project.org/package=formula.tools},
##   }
## 
## [[147]]
## 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},
##   }
## 
## [[148]]
## To cite package 'fracdiff' in publications use:
## 
##   Maechler M (2024). _fracdiff: Fractionally Differenced ARIMA aka
##   ARFIMA(P,d,q) Models_. R package version 1.5-3,
##   <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 = {2024},
##     note = {R package version 1.5-3},
##     url = {https://CRAN.R-project.org/package=fracdiff},
##   }
## 
## [[149]]
## To cite package 'fredr' in publications use:
## 
##   Boysel S, Vaughan D (2021). _fredr: An R Client for the 'FRED' API_.
##   R package version 2.1.0, <https://CRAN.R-project.org/package=fredr>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {fredr: An R Client for the 'FRED' API},
##     author = {Sam Boysel and Davis Vaughan},
##     year = {2021},
##     note = {R package version 2.1.0},
##     url = {https://CRAN.R-project.org/package=fredr},
##   }
## 
## [[150]]
## To cite package 'fs' in publications use:
## 
##   Hester J, Wickham H, Csárdi G (2024). _fs: Cross-Platform File System
##   Operations Based on 'libuv'_. R package version 1.6.4,
##   <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 = {2024},
##     note = {R package version 1.6.4},
##     url = {https://CRAN.R-project.org/package=fs},
##   }
## 
## [[151]]
## 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},
##   }
## 
## [[152]]
## 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},
##   }
## 
## [[153]]
## 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},
##   }
## 
## [[154]]
## 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.
## 
## [[155]]
## To cite package 'gamlss.add' in publications use:
## 
##   Stasinopoulos M, Rigby R (2024). _gamlss.add: Extra Additive Terms
##   for Generalized Additive Models for Location Scale and Shape_. R
##   package version 5.1-13,
##   <https://CRAN.R-project.org/package=gamlss.add>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {gamlss.add: Extra Additive Terms for Generalized Additive Models for
## Location Scale and Shape},
##     author = {Mikis Stasinopoulos and Robert Rigby},
##     year = {2024},
##     note = {R package version 5.1-13},
##     url = {https://CRAN.R-project.org/package=gamlss.add},
##   }
## 
## [[156]]
## To cite package 'gamlss.data' in publications use:
## 
##   Stasinopoulos M, Rigby B, De Bastiani F (2024). _gamlss.data: Data
##   for Generalised Additive Models for Location Scale and Shape_. R
##   package version 6.0-6,
##   <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 = {2024},
##     note = {R package version 6.0-6},
##     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")'.
## 
## [[157]]
## To cite package 'gamlss.dist' in publications use:
## 
##   Stasinopoulos M, Rigby R (2023). _gamlss.dist: Distributions for
##   Generalized Additive Models for Location Scale and Shape_. R package
##   version 6.1-1, <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 = {2023},
##     note = {R package version 6.1-1},
##     url = {https://CRAN.R-project.org/package=gamlss.dist},
##   }
## 
## [[158]]
## To cite package 'gargle' in publications use:
## 
##   Bryan J, Citro C, Wickham H (2023). _gargle: Utilities for Working
##   with Google APIs_. R package version 1.5.2,
##   <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 = {2023},
##     note = {R package version 1.5.2},
##     url = {https://CRAN.R-project.org/package=gargle},
##   }
## 
## [[159]]
## To cite package 'gclus' in publications use:
## 
##   Hurley C (2019). _gclus: Clustering Graphics_. R package version
##   1.3.2, <https://CRAN.R-project.org/package=gclus>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {gclus: Clustering Graphics},
##     author = {Catherine Hurley},
##     year = {2019},
##     note = {R package version 1.3.2},
##     url = {https://CRAN.R-project.org/package=gclus},
##   }
## 
## ATTENTION: This citation information has been auto-generated from the
## package DESCRIPTION file and may need manual editing, see
## 'help("citation")'.
## 
## [[160]]
## To cite package 'gdtools' in publications use:
## 
##   Gohel D, Wickham H, Henry L, Ooms J (2024). _gdtools: Utilities for
##   Graphical Rendering and Fonts Management_. R package version 0.3.7,
##   <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 = {2024},
##     note = {R package version 0.3.7},
##     url = {https://CRAN.R-project.org/package=gdtools},
##   }
## 
## [[161]]
## 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},
##   }
## 
## [[162]]
## 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},
##   }
## 
## [[163]]
## To cite package 'geometries' in publications use:
## 
##   Cooley D (2024). _geometries: Convert Between R Objects and Geometric
##   Structures_. R package version 0.2.4,
##   <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 = {2024},
##     note = {R package version 0.2.4},
##     url = {https://CRAN.R-project.org/package=geometries},
##   }
## 
## [[164]]
## 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},
##   }
## 
## [[165]]
## To cite package 'GGally' in publications use:
## 
##   Schloerke B, Cook D, Larmarange J, Briatte F, Marbach M, Thoen E,
##   Elberg A, Crowley J (2024). _GGally: Extension to 'ggplot2'_. R
##   package version 2.2.1, <https://CRAN.R-project.org/package=GGally>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {GGally: Extension to 'ggplot2'},
##     author = {Barret Schloerke and Di Cook and Joseph Larmarange and Francois Briatte and Moritz Marbach and Edwin Thoen and Amos Elberg and Jason Crowley},
##     year = {2024},
##     note = {R package version 2.2.1},
##     url = {https://CRAN.R-project.org/package=GGally},
##   }
## 
## [[166]]
## To cite package 'ggbiplot' in publications use:
## 
##   Vu VQ, Friendly M (2024). _ggbiplot: A Grammar of Graphics
##   Implementation of Biplots_. R package version 0.6.2,
##   <https://CRAN.R-project.org/package=ggbiplot>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {ggbiplot: A Grammar of Graphics Implementation of Biplots},
##     author = {Vincent Q. Vu and Michael Friendly},
##     year = {2024},
##     note = {R package version 0.6.2},
##     url = {https://CRAN.R-project.org/package=ggbiplot},
##   }
## 
## [[167]]
## To cite package 'ggcorrplot' in publications use:
## 
##   Kassambara A (2023). _ggcorrplot: Visualization of a Correlation
##   Matrix using 'ggplot2'_. R package version 0.1.4.1,
##   <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 = {2023},
##     note = {R package version 0.1.4.1},
##     url = {https://CRAN.R-project.org/package=ggcorrplot},
##   }
## 
## [[168]]
## To cite package 'ggdist' in publications use:
## 
##   Kay M (2024). "ggdist: Visualizations of Distributions and
##   Uncertainty in the Grammar of Graphics." _IEEE Transactions on
##   Visualization and Computer Graphics_, *30*(1), 414-424.
##   doi:10.1109/TVCG.2023.3327195
##   <https://doi.org/10.1109/TVCG.2023.3327195>.
## 
##   Kay M (2024). _ggdist: Visualizations of Distributions and
##   Uncertainty_. doi:10.5281/zenodo.3879620
##   <https://doi.org/10.5281/zenodo.3879620>, R package version 3.3.2,
##   <https://mjskay.github.io/ggdist/>.
## 
## To see these entries in BibTeX format, use 'print(<citation>,
## bibtex=TRUE)', 'toBibtex(.)', or set
## 'options(citation.bibtex.max=999)'.
## 
## [[169]]
## 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},
##   }
## 
## [[170]]
## To cite package 'ggExtra' in publications use:
## 
##   Attali D, Baker C (2023). _ggExtra: Add Marginal Histograms to
##   'ggplot2', and More 'ggplot2' Enhancements_. R package version
##   0.10.1, <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 = {2023},
##     note = {R package version 0.10.1},
##     url = {https://CRAN.R-project.org/package=ggExtra},
##   }
## 
## [[171]]
## To cite package 'ggforce' in publications use:
## 
##   Pedersen T (2024). _ggforce: Accelerating 'ggplot2'_. R package
##   version 0.4.2, <https://CRAN.R-project.org/package=ggforce>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {ggforce: Accelerating 'ggplot2'},
##     author = {Thomas Lin Pedersen},
##     year = {2024},
##     note = {R package version 0.4.2},
##     url = {https://CRAN.R-project.org/package=ggforce},
##   }
## 
## [[172]]
## 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},
##   }
## 
## [[173]]
## 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)'.
## 
## [[174]]
## 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},
##   }
## 
## [[175]]
## 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},
##   }
## 
## [[176]]
## To cite package 'ggpubr' in publications use:
## 
##   Kassambara A (2023). _ggpubr: 'ggplot2' Based Publication Ready
##   Plots_. R package version 0.6.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 = {2023},
##     note = {R package version 0.6.0},
##     url = {https://CRAN.R-project.org/package=ggpubr},
##   }
## 
## [[177]]
## To cite package 'ggraph' in publications use:
## 
##   Pedersen T (2024). _ggraph: An Implementation of Grammar of Graphics
##   for Graphs and Networks_. R package version 2.2.1,
##   <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 = {2024},
##     note = {R package version 2.2.1},
##     url = {https://CRAN.R-project.org/package=ggraph},
##   }
## 
## [[178]]
## To cite package 'ggrepel' in publications use:
## 
##   Slowikowski K (2023). _ggrepel: Automatically Position
##   Non-Overlapping Text Labels with 'ggplot2'_. R package version 0.9.4,
##   <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 = {2023},
##     note = {R package version 0.9.4},
##     url = {https://CRAN.R-project.org/package=ggrepel},
##   }
## 
## [[179]]
## To cite package 'ggridges' in publications use:
## 
##   Wilke C (2024). _ggridges: Ridgeline Plots in 'ggplot2'_. R package
##   version 0.5.6, <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 = {2024},
##     note = {R package version 0.5.6},
##     url = {https://CRAN.R-project.org/package=ggridges},
##   }
## 
## [[180]]
## To cite package 'ggsci' in publications use:
## 
##   Xiao N (2024). _ggsci: Scientific Journal and Sci-Fi Themed Color
##   Palettes for 'ggplot2'_. R package version 3.1.0,
##   <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 = {2024},
##     note = {R package version 3.1.0},
##     url = {https://CRAN.R-project.org/package=ggsci},
##   }
## 
## [[181]]
## 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},
##   }
## 
## [[182]]
## To cite package 'ggstats' in publications use:
## 
##   Larmarange J (2024). _ggstats: Extension to 'ggplot2' for Plotting
##   Stats_. R package version 0.6.0,
##   <https://CRAN.R-project.org/package=ggstats>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {ggstats: Extension to 'ggplot2' for Plotting Stats},
##     author = {Joseph Larmarange},
##     year = {2024},
##     note = {R package version 0.6.0},
##     url = {https://CRAN.R-project.org/package=ggstats},
##   }
## 
## [[183]]
## To cite package 'ggthemes' in publications use:
## 
##   Arnold J (2024). _ggthemes: Extra Themes, Scales and Geoms for
##   'ggplot2'_. R package version 5.1.0,
##   <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 = {2024},
##     note = {R package version 5.1.0},
##     url = {https://CRAN.R-project.org/package=ggthemes},
##   }
## 
## [[184]]
## To cite package 'glasso' in publications use:
## 
##   Friedman J, Hastie T, Tibshirani R (2019). _glasso: Graphical Lasso:
##   Estimation of Gaussian Graphical Models_. R package version 1.11,
##   <https://CRAN.R-project.org/package=glasso>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {glasso: Graphical Lasso: Estimation of Gaussian Graphical Models},
##     author = {Jerome Friedman and Trevor Hastie and Rob Tibshirani},
##     year = {2019},
##     note = {R package version 1.11},
##     url = {https://CRAN.R-project.org/package=glasso},
##   }
## 
## ATTENTION: This citation information has been auto-generated from the
## package DESCRIPTION file and may need manual editing, see
## 'help("citation")'.
## 
## [[185]]
## To cite package 'gld' in publications use:
## 
##   King R, Dean B, Klinke S, van Staden P (2022). _gld: Estimation and
##   Use of the Generalised (Tukey) Lambda Distribution_. R package
##   version 2.6.6, <https://CRAN.R-project.org/package=gld>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {gld: Estimation and Use of the Generalised (Tukey) Lambda
## Distribution},
##     author = {Robert King and Benjamin Dean and Sigbert Klinke and Paul {van Staden}},
##     year = {2022},
##     note = {R package version 2.6.6},
##     url = {https://CRAN.R-project.org/package=gld},
##   }
## 
## [[186]]
## 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},
##   }
## 
## [[187]]
## To cite package 'glmmML' in publications use:
## 
##   Broström G (2023). _glmmML: Generalized Linear Models with
##   Clustering_. R package version 1.1.6,
##   <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 = {2023},
##     note = {R package version 1.1.6},
##     url = {https://CRAN.R-project.org/package=glmmML},
##   }
## 
## [[188]]
## To cite glmnet in publications use:
## 
##   Friedman J, Tibshirani R, Hastie T (2010). "Regularization Paths for
##   Generalized Linear Models via Coordinate Descent." _Journal of
##   Statistical Software_, *33*(1), 1-22. doi:10.18637/jss.v033.i01
##   <https://doi.org/10.18637/jss.v033.i01>.
## 
## If coxnet is used, please also cite:
## 
##   Simon N, Friedman J, Tibshirani R, Hastie T (2011). "Regularization
##   Paths for Cox's Proportional Hazards Model via Coordinate Descent."
##   _Journal of Statistical Software_, *39*(5), 1-13.
##   doi:10.18637/jss.v039.i05 <https://doi.org/10.18637/jss.v039.i05>.
## 
## If glmnet is used for generalized linear models, please also cite:
## 
##   Tay JK, Narasimhan B, Hastie T (2023). "Elastic Net Regularization
##   Paths for All Generalized Linear Models." _Journal of Statistical
##   Software_, *106*(1), 1-31. doi:10.18637/jss.v106.i01
##   <https://doi.org/10.18637/jss.v106.i01>.
## 
## To see these entries in BibTeX format, use 'print(<citation>,
## bibtex=TRUE)', 'toBibtex(.)', or set
## 'options(citation.bibtex.max=999)'.
## 
## [[189]]
## 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")'.
## 
## [[190]]
## To cite package 'globals' in publications use:
## 
##   Bengtsson H (2024). _globals: Identify Global Objects in R
##   Expressions_. R package version 0.16.3,
##   <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 = {2024},
##     note = {R package version 0.16.3},
##     url = {https://CRAN.R-project.org/package=globals},
##   }
## 
## [[191]]
## 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},
##   }
## 
## [[192]]
## To cite package 'gmp' in publications use:
## 
##   Lucas A, Scholz I, Boehme R, Jasson S, Maechler M (2024). _gmp:
##   Multiple Precision Arithmetic_. R package version 0.7-4,
##   <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 = {2024},
##     note = {R package version 0.7-4},
##     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")'.
## 
## [[193]]
## To cite package 'googledrive' in publications use:
## 
##   D'Agostino McGowan L, Bryan J (2023). _googledrive: An Interface to
##   Google Drive_. R package version 2.1.1,
##   <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 = {2023},
##     note = {R package version 2.1.1},
##     url = {https://CRAN.R-project.org/package=googledrive},
##   }
## 
## [[194]]
## To cite package 'googlesheets4' in publications use:
## 
##   Bryan J (2023). _googlesheets4: Access Google Sheets using the Sheets
##   API V4_. R package version 1.1.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 = {2023},
##     note = {R package version 1.1.1},
##     url = {https://CRAN.R-project.org/package=googlesheets4},
##   }
## 
## [[195]]
## 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},
##   }
## 
## [[196]]
## 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/},
##   }
## 
## [[197]]
## 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
##   (2024). _gplots: Various R Programming Tools for Plotting Data_. R
##   package version 3.1.3.1, <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 = {2024},
##     note = {R package version 3.1.3.1},
##     url = {https://CRAN.R-project.org/package=gplots},
##   }
## 
## [[198]]
## To cite package 'graph' in publications use:
## 
##   Gentleman R, Whalen E, Huber W, Falcon S (2023). _graph: graph: A
##   package to handle graph data structures_. doi:10.18129/B9.bioc.graph
##   <https://doi.org/10.18129/B9.bioc.graph>, R package version 1.80.0,
##   <https://bioconductor.org/packages/graph>.
## 
## 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 = {2023},
##     note = {R package version 1.80.0},
##     url = {https://bioconductor.org/packages/graph},
##     doi = {10.18129/B9.bioc.graph},
##   }
## 
## [[199]]
## 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},
##   }
## 
## [[200]]
## 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},
##   }
## 
## [[201]]
## 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")'.
## 
## [[202]]
## To cite package 'gtable' in publications use:
## 
##   Wickham H, Pedersen T (2024). _gtable: Arrange 'Grobs' in Tables_. R
##   package version 0.3.5, <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 = {2024},
##     note = {R package version 0.3.5},
##     url = {https://CRAN.R-project.org/package=gtable},
##   }
## 
## [[203]]
## To cite package 'gtools' in publications use:
## 
##   Warnes G, Bolker B, Lumley T, Magnusson A, Venables B, Ryodan G,
##   Moeller S (2023). _gtools: Various R Programming Tools_. R package
##   version 3.9.5, <https://CRAN.R-project.org/package=gtools>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {gtools: Various R Programming Tools},
##     author = {Gregory R. Warnes and Ben Bolker and Thomas Lumley and Arni Magnusson and Bill Venables and Genei Ryodan and Steffen Moeller},
##     year = {2023},
##     note = {R package version 3.9.5},
##     url = {https://CRAN.R-project.org/package=gtools},
##   }
## 
## [[204]]
## To cite package 'hardhat' in publications use:
## 
##   Vaughan D, Kuhn M (2024). _hardhat: Construct Modeling Packages_. R
##   package version 1.3.1, <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 = {2024},
##     note = {R package version 1.3.1},
##     url = {https://CRAN.R-project.org/package=hardhat},
##   }
## 
## [[205]]
## 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.4,
##   <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.4},
##     url = {https://CRAN.R-project.org/package=haven},
##   }
## 
## [[206]]
## 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},
##   }
## 
## [[207]]
## 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},
##   }
## 
## [[208]]
## To cite package 'HistData' in publications use:
## 
##   Friendly M (2023). _HistData: Data Sets from the History of
##   Statistics and Data Visualization_. R package version 0.9-1,
##   <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 = {2023},
##     note = {R package version 0.9-1},
##     url = {https://CRAN.R-project.org/package=HistData},
##   }
## 
## [[209]]
## To cite package 'Hmisc' in publications use:
## 
##   Harrell Jr F (2023). _Hmisc: Harrell Miscellaneous_. R package
##   version 5.1-1, <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 = {2023},
##     note = {R package version 5.1-1},
##     url = {https://CRAN.R-project.org/package=Hmisc},
##   }
## 
## [[210]]
## 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},
##   }
## 
## [[211]]
## To cite package 'htmlTable' in publications use:
## 
##   Gordon M, Gragg S, Konings P (2023). _htmlTable: Advanced Tables for
##   Markdown/HTML_. R package version 2.4.2,
##   <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 = {2023},
##     note = {R package version 2.4.2},
##     url = {https://CRAN.R-project.org/package=htmlTable},
##   }
## 
## [[212]]
## To cite package 'htmltools' in publications use:
## 
##   Cheng J, Sievert C, Schloerke B, Chang W, Xie Y, Allen J (2024).
##   _htmltools: Tools for HTML_. R package version 0.5.8.1,
##   <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 = {2024},
##     note = {R package version 0.5.8.1},
##     url = {https://CRAN.R-project.org/package=htmltools},
##   }
## 
## [[213]]
## 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.4,
##   <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.4},
##     url = {https://CRAN.R-project.org/package=htmlwidgets},
##   }
## 
## [[214]]
## 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},
##   }
## 
## [[215]]
## To cite package 'httpuv' in publications use:
## 
##   Cheng J, Chang W, Reid S, Brown J, Trower B, Peslyak A (2024).
##   _httpuv: HTTP and WebSocket Server Library_. R package version
##   1.6.15, <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 = {2024},
##     note = {R package version 1.6.15},
##     url = {https://CRAN.R-project.org/package=httpuv},
##   }
## 
## [[216]]
## 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},
##   }
## 
## [[217]]
## 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},
##   }
## 
## [[218]]
## 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
## (2024). _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)'.
## 
## [[219]]
## To cite package 'imager' in publications use:
## 
##   Barthelme S (2024). _imager: Image Processing Library Based on
##   'CImg'_. R package version 1.0.2,
##   <https://CRAN.R-project.org/package=imager>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {imager: Image Processing Library Based on 'CImg'},
##     author = {Simon Barthelme},
##     year = {2024},
##     note = {R package version 1.0.2},
##     url = {https://CRAN.R-project.org/package=imager},
##   }
## 
## [[220]]
## 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},
##   }
## 
## [[221]]
## 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},
##   }
## 
## [[222]]
## To cite package 'inline' in publications use:
## 
##   Sklyar O, Murdoch D, Smith M, Eddelbuettel D, Francois R, Soetaert K,
##   Ranke J (2021). _inline: Functions to Inline C, C++, Fortran Function
##   Calls from R_. R package version 0.3.19,
##   <https://CRAN.R-project.org/package=inline>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {inline: Functions to Inline C, C++, Fortran Function Calls from R},
##     author = {Oleg Sklyar and Duncan Murdoch and Mike Smith and Dirk Eddelbuettel and Romain Francois and Karline Soetaert and Johannes Ranke},
##     year = {2021},
##     note = {R package version 0.3.19},
##     url = {https://CRAN.R-project.org/package=inline},
##   }
## 
## ATTENTION: This citation information has been auto-generated from the
## package DESCRIPTION file and may need manual editing, see
## 'help("citation")'.
## 
## [[223]]
## 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},
##   }
## 
## [[224]]
## 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},
##   }
## 
## [[225]]
## To cite package 'ipred' in publications use:
## 
##   Peters A, Hothorn T (2023). _ipred: Improved Predictors_. R package
##   version 0.9-14, <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 = {2023},
##     note = {R package version 0.9-14},
##     url = {https://CRAN.R-project.org/package=ipred},
##   }
## 
## [[226]]
## 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")'.
## 
## [[227]]
## 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},
##   }
## 
## [[228]]
## 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},
##   }
## 
## [[229]]
## 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")'.
## 
## [[230]]
## To cite package 'janeaustenr' in publications use:
## 
##   Silge J (2022). _janeaustenr: Jane Austen's Complete Novels_. R
##   package version 1.0.0,
##   <https://CRAN.R-project.org/package=janeaustenr>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {janeaustenr: Jane Austen's Complete Novels},
##     author = {Julia Silge},
##     year = {2022},
##     note = {R package version 1.0.0},
##     url = {https://CRAN.R-project.org/package=janeaustenr},
##   }
## 
## [[231]]
## To cite package 'janitor' in publications use:
## 
##   Firke S (2023). _janitor: Simple Tools for Examining and Cleaning
##   Dirty Data_. R package version 2.2.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 = {2023},
##     note = {R package version 2.2.0},
##     url = {https://CRAN.R-project.org/package=janitor},
##   }
## 
## [[232]]
## To cite package 'jomo' in publications use:
## 
##   Quartagno M, Carpenter J (2023). _jomo: A package for Multilevel
##   Joint Modelling Multiple Imputation_.
##   <https://CRAN.R-project.org/package=jomo>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {{jomo}: A package for Multilevel Joint Modelling Multiple Imputation},
##     author = {Matteo Quartagno and James Carpenter},
##     year = {2023},
##     url = {https://CRAN.R-project.org/package=jomo},
##   }
## 
## [[233]]
## 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")'.
## 
## [[234]]
## 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},
##   }
## 
## [[235]]
## 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},
##   }
## 
## [[236]]
## 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},
##   }
## 
## [[237]]
## To cite package 'kableExtra' in publications use:
## 
##   Zhu H (2024). _kableExtra: Construct Complex Table with 'kable' and
##   Pipe Syntax_. R package version 1.4.0,
##   <https://CRAN.R-project.org/package=kableExtra>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {kableExtra: Construct Complex Table with 'kable' and Pipe Syntax},
##     author = {Hao Zhu},
##     year = {2024},
##     note = {R package version 1.4.0},
##     url = {https://CRAN.R-project.org/package=kableExtra},
##   }
## 
## [[238]]
## To cite package 'keras' in publications use:
## 
##   Allaire J, Chollet F (2024). _keras: R Interface to 'Keras'_. R
##   package version 2.15.0, <https://CRAN.R-project.org/package=keras>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {keras: R Interface to 'Keras'},
##     author = {JJ Allaire and François Chollet},
##     year = {2024},
##     note = {R package version 2.15.0},
##     url = {https://CRAN.R-project.org/package=keras},
##   }
## 
## [[239]]
## 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},
##   }
## 
## [[240]]
## To cite package 'kernlab' in publications use:
## 
##   Karatzoglou A, Smola A, Hornik K (2023). _kernlab: Kernel-Based
##   Machine Learning Lab_. R package version 0.9-32,
##   <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)'.
## 
## [[241]]
## To cite package 'KernSmooth' in publications use:
## 
##   Wand M (2024). _KernSmooth: Functions for Kernel Smoothing Supporting
##   Wand & Jones (1995)_. R package version 2.23-24,
##   <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 = {2024},
##     note = {R package version 2.23-24},
##     url = {https://CRAN.R-project.org/package=KernSmooth},
##   }
## 
## [[242]]
## To cite package 'knitr' in publications use:
## 
##   Xie Y (2024). _knitr: A General-Purpose Package for Dynamic Report
##   Generation in R_. R package version 1.46, <https://yihui.org/knitr/>.
## 
##   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)'.
## 
## [[243]]
## To cite package 'kutils' in publications use:
## 
##   Johnson P, Kite B, Redmon C (2023). _kutils: Project Management
##   Tools_. R package version 1.73,
##   <https://CRAN.R-project.org/package=kutils>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {kutils: Project Management Tools},
##     author = {Paul Johnson and Benjamin Kite and Charles Redmon},
##     year = {2023},
##     note = {R package version 1.73},
##     url = {https://CRAN.R-project.org/package=kutils},
##   }
## 
## [[244]]
## 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")'.
## 
## [[245]]
## To cite package 'labelled' in publications use:
## 
##   Larmarange J (2024). _labelled: Manipulating Labelled Data_. R
##   package version 2.13.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 = {2024},
##     note = {R package version 2.13.0},
##     url = {https://CRAN.R-project.org/package=labelled},
##   }
## 
## [[246]]
## 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")'.
## 
## [[247]]
## 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.2,
##   <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.2},
##     url = {https://CRAN.R-project.org/package=later},
##   }
## 
## [[248]]
## To cite package 'latex2exp' in publications use:
## 
##   Meschiari S (2022). _latex2exp: Use LaTeX Expressions in Plots_. R
##   package version 0.9.6,
##   <https://CRAN.R-project.org/package=latex2exp>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {latex2exp: Use LaTeX Expressions in Plots},
##     author = {Stefano Meschiari},
##     year = {2022},
##     note = {R package version 0.9.6},
##     url = {https://CRAN.R-project.org/package=latex2exp},
##   }
## 
## [[249]]
## To cite package 'lattice' in publications use:
## 
##   Sarkar D (2008). _Lattice: Multivariate Data Visualization with R_.
##   Springer, New York. ISBN 978-0-387-75968-5,
##   <http://lmdvr.r-forge.r-project.org>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Book{,
##     title = {Lattice: Multivariate Data Visualization with R},
##     author = {Deepayan Sarkar},
##     year = {2008},
##     publisher = {Springer},
##     address = {New York},
##     isbn = {978-0-387-75968-5},
##     url = {http://lmdvr.r-forge.r-project.org},
##   }
## 
## [[250]]
## 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)'.
## 
## [[251]]
## 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},
##   }
## 
## [[252]]
## To cite package 'lavaanPlot' in publications use:
## 
##   Lishinski A (2024). _lavaanPlot: Path Diagrams for 'Lavaan' Models
##   via 'DiagrammeR'_. R package version 0.8.1,
##   <https://CRAN.R-project.org/package=lavaanPlot>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {lavaanPlot: Path Diagrams for 'Lavaan' Models via 'DiagrammeR'},
##     author = {Alex Lishinski},
##     year = {2024},
##     note = {R package version 0.8.1},
##     url = {https://CRAN.R-project.org/package=lavaanPlot},
##   }
## 
## ATTENTION: This citation information has been auto-generated from the
## package DESCRIPTION file and may need manual editing, see
## 'help("citation")'.
## 
## [[253]]
## 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},
##   }
## 
## [[254]]
## To cite package 'leafem' in publications use:
## 
##   Appelhans T (2023). _leafem: 'leaflet' Extensions for 'mapview'_. R
##   package version 0.2.3, <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 = {2023},
##     note = {R package version 0.2.3},
##     url = {https://CRAN.R-project.org/package=leafem},
##   }
## 
## [[255]]
## To cite package 'leaflet' in publications use:
## 
##   Cheng J, Schloerke B, Karambelkar B, Xie Y (2024). _leaflet: Create
##   Interactive Web Maps with the JavaScript 'Leaflet' Library_. R
##   package version 2.2.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 Barret Schloerke and Bhaskar Karambelkar and Yihui Xie},
##     year = {2024},
##     note = {R package version 2.2.2},
##     url = {https://CRAN.R-project.org/package=leaflet},
##   }
## 
## [[256]]
## 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},
##   }
## 
## [[257]]
## To cite package 'leaflet.providers' in publications use:
## 
##   Huang L (2023). _leaflet.providers: Leaflet Providers_. R package
##   version 2.0.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 = {2023},
##     note = {R package version 2.0.0},
##     url = {https://CRAN.R-project.org/package=leaflet.providers},
##   }
## 
## [[258]]
## 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},
##   }
## 
## [[259]]
## 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")'.
## 
## [[260]]
## 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")'.
## 
## [[261]]
## 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},
##   }
## 
## [[262]]
## To cite package 'libcoin' in publications use:
## 
##   Hothorn T, Winell H (2023). _libcoin: Linear Test Statistics for
##   Permutation Inference_. R package version 1.0-10,
##   <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 and Henric Winell},
##     year = {2023},
##     note = {R package version 1.0-10},
##     url = {https://CRAN.R-project.org/package=libcoin},
##   }
## 
## [[263]]
## 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},
##   }
## 
## [[264]]
## To cite package 'lisrelToR' in publications use:
## 
##   Epskamp S (2024). _lisrelToR: Import Output from LISREL into R_. R
##   package version 0.3, <https://CRAN.R-project.org/package=lisrelToR>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {lisrelToR: Import Output from LISREL into R},
##     author = {Sacha Epskamp},
##     year = {2024},
##     note = {R package version 0.3},
##     url = {https://CRAN.R-project.org/package=lisrelToR},
##   }
## 
## ATTENTION: This citation information has been auto-generated from the
## package DESCRIPTION file and may need manual editing, see
## 'help("citation")'.
## 
## [[265]]
## To cite package 'listenv' in publications use:
## 
##   Bengtsson H (2024). _listenv: Environments Behaving (Almost) as
##   Lists_. R package version 0.9.1,
##   <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 = {2024},
##     note = {R package version 0.9.1},
##     url = {https://CRAN.R-project.org/package=listenv},
##   }
## 
## [[266]]
## 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},
##   }
## 
## [[267]]
## To cite package 'lmom' in publications use:
## 
##   J. R. M. Hosking (2023). L-Moments. R package, version 3.0. URL:
##   https://CRAN.R-project.org/package=lmom.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {L-Moments},
##     author = {J. R. M. Hosking},
##     year = {2023},
##     note = {R package, version 3.0},
##     url = {https://CRAN.R-project.org/package=lmom},
##   }
## 
## [[268]]
## 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/},
##   }
## 
## [[269]]
## 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},
##   }
## 
## [[270]]
## To cite the loo R package:
## 
##   Vehtari A, Gabry J, Magnusson M, Yao Y, Bürkner P, Paananen T, Gelman
##   A (2024). "loo: Efficient leave-one-out cross-validation and WAIC for
##   Bayesian models." R package version 2.7.0,
##   <https://mc-stan.org/loo/>.
## 
## To cite the loo paper:
## 
##   Vehtari A, Gelman A, Gabry J (2017). "Practical Bayesian model
##   evaluation using leave-one-out cross-validation and WAIC."
##   _Statistics and Computing_, *27*, 1413-1432.
##   doi:10.1007/s11222-016-9696-4
##   <https://doi.org/10.1007/s11222-016-9696-4>.
## 
## To cite the stacking paper:
## 
##   Yao Y, Vehtari A, Simpson D, Gelman A (2017). "Using stacking to
##   average Bayesian predictive distributions." _Bayesian Analysis_.
##   doi:10.1214/17-BA1091 <https://doi.org/10.1214/17-BA1091>.
## 
## To see these entries in BibTeX format, use 'print(<citation>,
## bibtex=TRUE)', 'toBibtex(.)', or set
## 'options(citation.bibtex.max=999)'.
## 
## [[271]]
## To cite package 'lpSolve' in publications use:
## 
##   Berkelaar M, others (2023). _lpSolve: Interface to 'Lp_solve' v. 5.5
##   to Solve Linear/Integer Programs_. R package version 5.6.20,
##   <https://CRAN.R-project.org/package=lpSolve>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {lpSolve: Interface to 'Lp_solve' v. 5.5 to Solve Linear/Integer Programs},
##     author = {Michel Berkelaar and others},
##     year = {2023},
##     note = {R package version 5.6.20},
##     url = {https://CRAN.R-project.org/package=lpSolve},
##   }
## 
## ATTENTION: This citation information has been auto-generated from the
## package DESCRIPTION file and may need manual editing, see
## 'help("citation")'.
## 
## [[272]]
## To cite package 'lpSolveAPI' in publications use:
## 
##   lp_solve, Konis K, Schwendinger F, Hornik K (2024). _lpSolveAPI: R
##   Interface to 'lp_solve' Version 5.5.2.0_. R package version
##   5.5.2.0-17.12, <https://CRAN.R-project.org/package=lpSolveAPI>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {lpSolveAPI: R Interface to 'lp_solve' Version 5.5.2.0},
##     author = {{lp_solve} and Kjell Konis and Florian Schwendinger and Kurt Hornik},
##     year = {2024},
##     note = {R package version 5.5.2.0-17.12},
##     url = {https://CRAN.R-project.org/package=lpSolveAPI},
##   }
## 
## ATTENTION: This citation information has been auto-generated from the
## package DESCRIPTION file and may need manual editing, see
## 'help("citation")'.
## 
## [[273]]
## 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/},
##   }
## 
## [[274]]
## To cite package 'lwgeom' in publications use:
## 
##   Pebesma E (2024). _lwgeom: Bindings to Selected 'liblwgeom' Functions
##   for Simple Features_. R package version 0.2-14,
##   <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 = {2024},
##     note = {R package version 0.2-14},
##     url = {https://CRAN.R-project.org/package=lwgeom},
##   }
## 
## [[275]]
## To cite package 'magick' in publications use:
## 
##   Ooms J (2024). _magick: Advanced Graphics and Image-Processing in R_.
##   R package version 2.8.3, <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 = {2024},
##     note = {R package version 2.8.3},
##     url = {https://CRAN.R-project.org/package=magick},
##   }
## 
## [[276]]
## 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},
##   }
## 
## [[277]]
## To cite package 'mapproj' in publications use:
## 
##   Brownrigg DMPfRbR, Minka TP, Bivand. ttP9cbR (2023). _mapproj: Map
##   Projections_. R package version 1.2.11,
##   <https://CRAN.R-project.org/package=mapproj>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {mapproj: Map Projections},
##     author = {Doug McIlroy. Packaged for R by Ray Brownrigg and Thomas P Minka and transition to Plan 9 codebase by Roger Bivand.},
##     year = {2023},
##     note = {R package version 1.2.11},
##     url = {https://CRAN.R-project.org/package=mapproj},
##   }
## 
## ATTENTION: This citation information has been auto-generated from the
## package DESCRIPTION file and may need manual editing, see
## 'help("citation")'.
## 
## [[278]]
## To cite package 'maps' in publications use:
## 
##   Becker OScbRA, Minka ARWRvbRBEbTP, Deckmyn. A (2023). _maps: Draw
##   Geographical Maps_. R package version 3.4.2,
##   <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 = {2023},
##     note = {R package version 3.4.2},
##     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")'.
## 
## [[279]]
## To cite package 'markdown' in publications use:
## 
##   Xie Y, Allaire J, Horner J (2023). _markdown: Render Markdown with
##   'commonmark'_. R package version 1.12,
##   <https://CRAN.R-project.org/package=markdown>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {markdown: Render Markdown with 'commonmark'},
##     author = {Yihui Xie and JJ Allaire and Jeffrey Horner},
##     year = {2023},
##     note = {R package version 1.12},
##     url = {https://CRAN.R-project.org/package=markdown},
##   }
## 
## [[280]]
## To cite package 'markovchain' in publications use:
## 
##   Spedicato G (2017). "Discrete Time Markov Chains with R." _The R
##   Journal_, *9*(2), 84-104.
##   <https://journal.r-project.org/archive/2017/RJ-2017-036/index.html>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Article{,
##     title = {Discrete Time Markov Chains with R},
##     author = {Giorgio Alfredo Spedicato},
##     journal = {The R Journal},
##     year = {2017},
##     volume = {9},
##     number = {2},
##     pages = {84--104},
##     url = {https://journal.r-project.org/archive/2017/RJ-2017-036/index.html},
##   }
## 
## [[281]]
## To cite package 'Matrix' in publications use:
## 
##   Bates D, Maechler M, Jagan M (2023). _Matrix: Sparse and Dense Matrix
##   Classes and Methods_. R package version 1.6-4,
##   <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 = {2023},
##     note = {R package version 1.6-4},
##     url = {https://CRAN.R-project.org/package=Matrix},
##   }
## 
## [[282]]
## To cite package 'matrixcalc' in publications use:
## 
##   Novomestky F (2022). _matrixcalc: Collection of Functions for Matrix
##   Calculations_. R package version 1.0-6,
##   <https://CRAN.R-project.org/package=matrixcalc>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {matrixcalc: Collection of Functions for Matrix Calculations},
##     author = {Frederick Novomestky},
##     year = {2022},
##     note = {R package version 1.0-6},
##     url = {https://CRAN.R-project.org/package=matrixcalc},
##   }
## 
## ATTENTION: This citation information has been auto-generated from the
## package DESCRIPTION file and may need manual editing, see
## 'help("citation")'.
## 
## [[283]]
## To cite package 'MatrixModels' in publications use:
## 
##   Bates D, Maechler M (2023). _MatrixModels: Modelling with Sparse and
##   Dense Matrices_. R package version 0.5-3,
##   <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 = {2023},
##     note = {R package version 0.5-3},
##     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")'.
## 
## [[284]]
## To cite package 'matrixStats' in publications use:
## 
##   Bengtsson H (2024). _matrixStats: Functions that Apply to Rows and
##   Columns of Matrices (and to Vectors)_. R package version 1.3.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 = {2024},
##     note = {R package version 1.3.0},
##     url = {https://CRAN.R-project.org/package=matrixStats},
##   }
## 
## [[285]]
## To cite 'mclust' R package in publications, please use:
## 
##   Scrucca L, Fraley C, Murphy TB, Raftery AE (2023). _Model-Based
##   Clustering, Classification, and Density Estimation Using mclust in
##   R_. Chapman and Hall/CRC. ISBN 978-1032234953,
##   doi:10.1201/9781003277965 <https://doi.org/10.1201/9781003277965>,
##   <https://mclust-org.github.io/book/>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Book{,
##     title = {Model-Based Clustering, Classification, and Density Estimation Using {mclust} in {R}},
##     author = {Luca Scrucca and Chris Fraley and T. Brendan Murphy and Adrian E. Raftery},
##     publisher = {Chapman and Hall/CRC},
##     isbn = {978-1032234953},
##     doi = {10.1201/9781003277965},
##     year = {2023},
##     url = {https://mclust-org.github.io/book/},
##   }
## 
## [[286]]
## 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},
##   }
## 
## [[287]]
## 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)'.
## 
## [[288]]
## To cite metR in publications use:
## 
## 
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {metR: Tools for Easier Analysis of Meteorological Fields},
##     author = {Elio Campitelli},
##     year = {2021},
##     note = {R package version 0.15.0},
##     url = {https://eliocamp.github.io/metR/},
##     doi = {10.5281/zenodo.2593516},
##   }
## 
## [[289]]
## 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},
##   }
## 
## [[290]]
## 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)'.
## 
## [[291]]
## To cite package 'mi' in publications use:
## 
##   Gelman A, Hill J (2011). "Opening Windows to the Black Box." _Journal
##   of Statistical Software_, *40*.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Article{,
##     title = {Opening Windows to the Black Box},
##     author = {Andrew Gelman and Jennifer Hill},
##     journal = {Journal of Statistical Software},
##     year = {2011},
##     volume = {40},
##   }
## 
## [[292]]
## 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},
##   }
## 
## [[293]]
## 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},
##   }
## 
## [[294]]
## 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},
##   }
## 
## [[295]]
## 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")'.
## 
## [[296]]
## To cite package 'mitml' in publications use:
## 
##   Grund S, Robitzsch A, Luedtke O (2023). _mitml: Tools for Multiple
##   Imputation in Multilevel Modeling_. R package version 0.4-5,
##   <https://CRAN.R-project.org/package=mitml>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {mitml: Tools for Multiple Imputation in Multilevel Modeling},
##     author = {Simon Grund and Alexander Robitzsch and Oliver Luedtke},
##     year = {2023},
##     note = {R package version 0.4-5},
##     url = {https://CRAN.R-project.org/package=mitml},
##   }
## 
## ATTENTION: This citation information has been auto-generated from the
## package DESCRIPTION file and may need manual editing, see
## 'help("citation")'.
## 
## [[297]]
## When using mlbench in publications, please cite both the mlbench
## package and, if applicable, the 1998 UCI Machine Learning Repository
## itself:
## 
##   Leisch F, Dimitriadou E (2024). _mlbench: Machine Learning Benchmark
##   Problems_. R package version 2.1-5,
##   <https://CRAN.R-project.org/package=mlbench>.
## 
## To cite the 1998 UCI Machine Learning Repository, please use:
## 
##   Blake CL, Merz CJ (1998). _UCI Repository of Machine Learning
##   Databases_. University of California, Irvine, Department of
##   Information and Computer Sciences, Irvine, CA. Formerly available
##   from <http://www.ics.uci.edu/~mlearn/MLRepository.html>.
## 
## To see these entries in BibTeX format, use 'print(<citation>,
## bibtex=TRUE)', 'toBibtex(.)', or set
## 'options(citation.bibtex.max=999)'.
## 
## [[298]]
## To cite package 'MLmetrics' in publications use:
## 
##   Yan Y (2024). _MLmetrics: Machine Learning Evaluation Metrics_. R
##   package version 1.1.3,
##   <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 = {2024},
##     note = {R package version 1.1.3},
##     url = {https://CRAN.R-project.org/package=MLmetrics},
##   }
## 
## [[299]]
## To cite package 'mlpack' in publications use:
## 
##   Singh Parihar Y, Curtin R, Eddelbuettel D, Balamuta J (2024).
##   _mlpack: 'Rcpp' Integration for the 'mlpack' Library_. R package
##   version 4.3.0.1, <https://CRAN.R-project.org/package=mlpack>.
## 
##   Curtin R, Edel M, Shrit O, Agrawal S, Basak S, Balamuta J, Birmingham
##   R, Dutt K, Eddelbuettel D, Garg R, Jaiswal S, Kaushik A, Kim S,
##   Mukherjee A, Sai N, Sharma N, Parihar Y, Swain R, Sanderson C (2023).
##   "mlpack 4: a fast, header-only C++ machine learning library."
##   _Journal of Open Source Software_, *8*(82). doi:10.21105/joss.05026
##   <https://doi.org/10.21105/joss.05026>.
## 
## To see these entries in BibTeX format, use 'print(<citation>,
## bibtex=TRUE)', 'toBibtex(.)', or set
## 'options(citation.bibtex.max=999)'.
## 
## [[300]]
## 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/},
##   }
## 
## [[301]]
## To cite package 'modeldata' in publications use:
## 
##   Kuhn M (2024). _modeldata: Data Sets Useful for Modeling Examples_. R
##   package version 1.3.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 = {2024},
##     note = {R package version 1.3.0},
##     url = {https://CRAN.R-project.org/package=modeldata},
##   }
## 
## [[302]]
## To cite package 'modelenv' in publications use:
## 
##   Hvitfeldt E (2023). _modelenv: Provide Tools to Register Models for
##   Use in 'tidymodels'_. R package version 0.1.1,
##   <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 = {2023},
##     note = {R package version 0.1.1},
##     url = {https://CRAN.R-project.org/package=modelenv},
##   }
## 
## [[303]]
## 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},
##   }
## 
## [[304]]
## To cite package 'modelr' in publications use:
## 
##   Wickham H (2023). _modelr: Modelling Functions that Work with the
##   Pipe_. R package version 0.1.11,
##   <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 = {2023},
##     note = {R package version 0.1.11},
##     url = {https://CRAN.R-project.org/package=modelr},
##   }
## 
## [[305]]
## 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")'.
## 
## [[306]]
## 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")'.
## 
## [[307]]
## 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},
##   }
## 
## [[308]]
## To cite package 'mosaicCalc' in publications use:
## 
##   Kaplan DT, Pruim R, Horton NJ (2024). _mosaicCalc: R-Language Based
##   Calculus Operations for Teaching_. R package version 0.6.1,
##   <https://CRAN.R-project.org/package=mosaicCalc>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {mosaicCalc: R-Language Based Calculus Operations for Teaching},
##     author = {Daniel T. Kaplan and Randall Pruim and Nicholas J. Horton},
##     year = {2024},
##     note = {R package version 0.6.1},
##     url = {https://CRAN.R-project.org/package=mosaicCalc},
##   }
## 
## ATTENTION: This citation information has been auto-generated from the
## package DESCRIPTION file and may need manual editing, see
## 'help("citation")'.
## 
## [[309]]
## 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")'.
## 
## [[310]]
## 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")'.
## 
## [[311]]
## To cite MplusAutomation in publications use:
## 
##   Hallquist, M. N. & Wiley, J. F. (2018). MplusAutomation: An R Package
##   for Facilitating Large-Scale Latent Variable Analyses in Mplus
##   Structural Equation Modeling, 25, 621-638. doi:
##   10.1080/10705511.2017.1402334.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Article{,
##     title = {{MplusAutomation}: An {R} Package for Facilitating Large-Scale Latent Variable Analyses in {Mplus}},
##     author = {Michael N. Hallquist and Joshua F. Wiley},
##     journal = {Structural Equation Modeling},
##     year = {2018},
##     pages = {621--638},
##     doi = {10.1080/10705511.2017.1402334},
##     url = {https://www.tandfonline.com/doi/full/10.1080/10705511.2017.1402334},
##   }
## 
## [[312]]
## Please cite the multcomp package by the following reference:
## 
##   Hothorn T, Bretz F, Westfall P (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},
##   }
## 
## [[313]]
## To cite package 'multcompView' in publications use:
## 
##   Graves S, Piepho H, Dorai-Raj LSwhfS (2024). _multcompView:
##   Visualizations of Paired Comparisons_. R package version 0.1-10,
##   <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 = {2024},
##     note = {R package version 0.1-10},
##     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")'.
## 
## [[314]]
## To cite package 'munsell' in publications use:
## 
##   Wickham C (2024). _munsell: Utilities for Using Munsell Colours_. R
##   package version 0.5.1, <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 = {2024},
##     note = {R package version 0.5.1},
##     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")'.
## 
## [[315]]
## To cite package 'mvtnorm' in publications use:
## 
##   Genz A, Bretz F (2009). _Computation of Multivariate Normal and t
##   Probabilities_, series Lecture Notes in Statistics. Springer-Verlag,
##   Heidelberg. ISBN 978-3-642-01688-2.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Book{,
##     title = {Computation of Multivariate Normal and t Probabilities},
##     author = {Alan Genz and Frank Bretz},
##     series = {Lecture Notes in Statistics},
##     year = {2009},
##     publisher = {Springer-Verlag},
##     address = {Heidelberg},
##     isbn = {978-3-642-01688-2},
##   }
## 
## [[316]]
## To cite package 'ndjson' in publications use:
## 
##   Rudis B, Lohmann N, Bandyopadhyay D, Kettner L (2022). _ndjson:
##   Wicked-Fast Streaming 'JSON' ('ndjson') Reader_. R package version
##   0.9.0, <https://CRAN.R-project.org/package=ndjson>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {ndjson: Wicked-Fast Streaming 'JSON' ('ndjson') Reader},
##     author = {Bob Rudis and Niels Lohmann and Deepak Bandyopadhyay and Lutz Kettner},
##     year = {2022},
##     note = {R package version 0.9.0},
##     url = {https://CRAN.R-project.org/package=ndjson},
##   }
## 
## [[317]]
## 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},
##   }
## 
## [[318]]
## 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},
##   }
## 
## [[319]]
## To cite package 'nlme' in publications use:
## 
##   Pinheiro J, Bates D, R Core Team (2023). _nlme: Linear and Nonlinear
##   Mixed Effects Models_. R package version 3.1-164,
##   <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)'.
## 
## [[320]]
## 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.
## 
## [[321]]
## To cite package 'NLP' in publications use:
## 
##   Hornik K (2020). _NLP: Natural Language Processing Infrastructure_. R
##   package version 0.2-1, <https://CRAN.R-project.org/package=NLP>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {NLP: Natural Language Processing Infrastructure},
##     author = {Kurt Hornik},
##     year = {2020},
##     note = {R package version 0.2-1},
##     url = {https://CRAN.R-project.org/package=NLP},
##   }
## 
## [[322]]
## To cite package 'nonnest2' in publications use:
## 
##   Merkle E, You D (2024). _nonnest2: Tests of Non-Nested Models_. R
##   package version 0.5-7, <https://CRAN.R-project.org/package=nonnest2>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {nonnest2: Tests of Non-Nested Models},
##     author = {Edgar Merkle and Dongjun You},
##     year = {2024},
##     note = {R package version 0.5-7},
##     url = {https://CRAN.R-project.org/package=nonnest2},
##   }
## 
## [[323]]
## 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},
##   }
## 
## [[324]]
## 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")'.
## 
## [[325]]
## To cite package 'officer' in publications use:
## 
##   Gohel D, Moog S (2024). _officer: Manipulation of Microsoft Word and
##   PowerPoint Documents_. R package version 0.6.6,
##   <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 and Stefan Moog},
##     year = {2024},
##     note = {R package version 0.6.6},
##     url = {https://CRAN.R-project.org/package=officer},
##   }
## 
## [[326]]
## To cite package '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)},
##     journal = {PLoS One},
##     volume = {16},
##     number = {9},
##     pages = {e0255838},
##     year = {2021},
##     issn = {2352-9148},
##     doi = {10.1371/journal.pone.0255838},
##     url = {https://journals.plos.org/plosone/article?id=10.1371/journal.pone.0255838},
##     author = {Jörn Lötsch and Sebastian Malkusch and Alfred Ultsch},
##   }
## 
## [[327]]
## Please cite both the package and the original articles / software in
## your publications:
## 
##   Mouselimis L (2023). _OpenImageR: An Image Processing Toolkit_. R
##   package version 1.3.0,
##   <https://CRAN.R-project.org/package=OpenImageR>.
## 
##   Machine S (2012). _SimpleCV: The Open Source Framework for Machine
##   Vision_. findHOGFeatures function of the SimpleCV computer vision
##   platform, <https://github.com/sightmachine/SimpleCV>.
## 
##   Buchner J (2013). _imagehash: A Python Perceptual Image Hashing
##   Module_. average_hash, dhash and phash functions of the ImageHash
##   python library, <https://github.com/JohannesBuchner/imagehash>.
## 
##   Haghighat M, Zonouz S, Abdel-Mottaleb M (2015). "CloudID: Trustworthy
##   cloud-based and cross-enterprise biometric identification." _Expert
##   Systems with Applications_, *42*, 7905-7916.
##   doi:10.1016/j.eswa.2015.06.025
##   <https://doi.org/10.1016/j.eswa.2015.06.025>.
## 
##   Haghighat M (2015). _gabor: Gabor Feature Extraction_.
##   <https://github.com/mhaghighat/gabor>.
## 
##   Achanta R, Shaji A, Smith K, Lucchi A, Fua P, Suesstrunk S (2012).
##   "SLIC Superpixels Compared to State-of-the-art Superpixel Methods."
##   _IEEE Transactions on Pattern Analysis and Machine Intelligence_,
##   *34*, 2274-2282. doi:10.1109/TPAMI.2012.120
##   <https://doi.org/10.1109/TPAMI.2012.120>.
## 
##   Achanta R, Shaji A, Smith K, Lucchi A, Fua P, Suesstrunk S (2010).
##   "SLIC Superpixels." Technical Report 149300, EPFL Technical Report.
## 
##   Onyshchak O (2019). _ImageTransformations: Implementation of OpenCV
##   methods for affine and perspective transformation_.
##   <https://github.com/OlehOnyshchak>.
## 
## To see these entries in BibTeX format, use 'print(<citation>,
## bibtex=TRUE)', 'toBibtex(.)', or set
## 'options(citation.bibtex.max=999)'.
## 
## [[328]]
## To cite package 'OpenMx' in publications use:
## 
##   Boker SM, Neale MC, Maes HH, Spiegel M, Brick TR, Estabrook R, Bates
##   TC, Gore RJ, Hunter MD, Pritikin JN, Zahery M, Kirkpatrick RM (2023).
##   _OpenMx: Extended Structural Equation Modelling_. R package version
##   2.21.11, <https://CRAN.R-project.org/package=OpenMx>.
## 
##   Michael C. Neale, Michael D. Hunter, Joshua N. Pritikin, Mahsa
##   Zahery, Timothy R. Brick Robert M. Kirkpatrick, Ryne Estabrook,
##   Timothy C. Bates, Hermine H. Maes, Steven M. Boker. (2016). OpenMx
##   2.0: Extended structural equation and statistical modeling.
##   Psychometrika, 81(2), 535-549. doi:10.1007/s11336-014-9435-8
## 
## OpenMx was developed with support from NIH/NIDA grants:
## 
## R37-DA018673, R25-DA026119, R21-DA024304
## 
##   Pritikin, J. N., Hunter, M. D., & Boker, S. M. (2015). Modular
##   open-source software for Item Factor Analysis. Educational and
##   Psychological Measurement, 75(3), 458-474
## 
##   Hunter, M. D. (2018). State space modeling in an open source,
##   modular, structural equation modeling environment. Structural
##   Equation Modeling, 25(2), 307-324. doi: 10.1080/10705511.2017.1369354
## 
## To see these entries in BibTeX format, use 'print(<citation>,
## bibtex=TRUE)', 'toBibtex(.)', or set
## 'options(citation.bibtex.max=999)'.
## 
## [[329]]
## To cite package 'openssl' in publications use:
## 
##   Ooms J (2024). _openssl: Toolkit for Encryption, Signatures and
##   Certificates Based on OpenSSL_. R package version 2.2.0,
##   <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 = {2024},
##     note = {R package version 2.2.0},
##     url = {https://CRAN.R-project.org/package=openssl},
##   }
## 
## [[330]]
## To cite package 'openxlsx' in publications use:
## 
##   Schauberger P, Walker A (2023). _openxlsx: Read, Write and Edit xlsx
##   Files_. R package version 4.2.5.2,
##   <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 = {2023},
##     note = {R package version 4.2.5.2},
##     url = {https://CRAN.R-project.org/package=openxlsx},
##   }
## 
## [[331]]
## To cite package 'operator.tools' in publications use:
## 
##   Brown C (2017). _operator.tools: Utilities for Working with R's
##   Operators_. R package version 1.6.3,
##   <https://CRAN.R-project.org/package=operator.tools>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {operator.tools: Utilities for Working with R's Operators},
##     author = {Christopher Brown},
##     year = {2017},
##     note = {R package version 1.6.3},
##     url = {https://CRAN.R-project.org/package=operator.tools},
##   }
## 
## [[332]]
## To cite 'ordinal' in publications use:
## 
##   Christensen R (2023). _ordinal-Regression Models for Ordinal Data_. R
##   package version 2023.12-4,
##   <https://CRAN.R-project.org/package=ordinal>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {ordinal---Regression Models for Ordinal Data},
##     author = {Rune H. B. Christensen},
##     year = {2023},
##     note = {R package version 2023.12-4},
##     url = {https://CRAN.R-project.org/package=ordinal},
##   }
## 
## [[333]]
## To cite package 'orthopolynom' in publications use:
## 
##   Novomestky F (2022). _orthopolynom: Collection of Functions for
##   Orthogonal and Orthonormal Polynomials_. R package version 1.0-6.1,
##   <https://CRAN.R-project.org/package=orthopolynom>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {orthopolynom: Collection of Functions for Orthogonal and Orthonormal
## Polynomials},
##     author = {Frederick Novomestky},
##     year = {2022},
##     note = {R package version 1.0-6.1},
##     url = {https://CRAN.R-project.org/package=orthopolynom},
##   }
## 
## ATTENTION: This citation information has been auto-generated from the
## package DESCRIPTION file and may need manual editing, see
## 'help("citation")'.
## 
## [[334]]
## To cite package 'packrat' in publications use:
## 
##   Atkins A, Allen T, Ushey K, McPherson J, Cheng J, Allaire J (2023).
##   _packrat: A Dependency Management System for Projects and their R
##   Package Dependencies_. R package version 0.9.2,
##   <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 = {Aron Atkins and Toph Allen and Kevin Ushey and Jonathan McPherson and Joe Cheng and JJ Allaire},
##     year = {2023},
##     note = {R package version 0.9.2},
##     url = {https://CRAN.R-project.org/package=packrat},
##   }
## 
## [[335]]
## To cite package 'pamr' in publications use:
## 
##   Hastie T, Tibshirani R, Narasimhan B, Chu G (2024). _pamr: Pam:
##   Prediction Analysis for Microarrays_. R package version 1.56.2,
##   <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 = {2024},
##     note = {R package version 1.56.2},
##     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")'.
## 
## [[336]]
## To cite package 'pan' in publications use:
## 
##   Jing Hua Zhao and Joseph L. Schafer (2023). pan: Multiple imputation
##   for multivariate panel or clustered dataR package version 1.9.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {pan: Multiple imputation for multivariate panel or clustered data},
##     author = {Jing Hua Zhao and Joseph L. Schafer},
##     year = {2023},
##     note = {R package version 1.9},
##   }
## 
## [[337]]
## 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},
##   }
## 
## [[338]]
## To cite package 'parallelly' in publications use:
## 
##   Bengtsson H (2024). _parallelly: Enhancing the 'parallel' Package_. R
##   package version 1.37.1,
##   <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 = {2024},
##     note = {R package version 1.37.1},
##     url = {https://CRAN.R-project.org/package=parallelly},
##   }
## 
## [[339]]
## 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},
##   }
## 
## [[340]]
## To cite package 'parsnip' in publications use:
## 
##   Kuhn M, Vaughan D (2024). _parsnip: A Common API to Modeling and
##   Analysis Functions_. R package version 1.2.1,
##   <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 = {2024},
##     note = {R package version 1.2.1},
##     url = {https://CRAN.R-project.org/package=parsnip},
##   }
## 
## [[341]]
## If ctree() is used additionally cite: If mob() is used additionally
## cite: If cforest() is used cite:
## 
##   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>.
## 
##   Hothorn T, Buehlmann P, Dudoit S, Molinaro A, Van Der Laan M (2006).
##   "Survival Ensembles." _Biostatistics_, *7*(3), 355-373.
##   doi:10.1093/biostatistics/kxj011
##   <https://doi.org/10.1093/biostatistics/kxj011>.
## 
##   Strobl C, Boulesteix A, Zeileis A, Hothorn T (2007). "Bias in Random
##   Forest Variable Importance Measures: Illustrations, Sources and a
##   Solution." _BMC Bioinformatics_, *8*(25). doi:10.1186/1471-2105-8-25
##   <https://doi.org/10.1186/1471-2105-8-25>.
## 
##   Strobl C, Boulesteix A, Kneib T, Augustin T, Zeileis A (2008).
##   "Conditional Variable Importance for Random Forests." _BMC
##   Bioinformatics_, *9*(307). doi:10.1186/1471-2105-9-307
##   <https://doi.org/10.1186/1471-2105-9-307>.
## 
## To see these entries in BibTeX format, use 'print(<citation>,
## bibtex=TRUE)', 'toBibtex(.)', or set
## 'options(citation.bibtex.max=999)'.
## 
## [[342]]
## If ctree() is used additionally cite: If mob() is used additionally
## cite:
## 
##   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)'.
## 
## [[343]]
## To cite package 'patchwork' in publications use:
## 
##   Pedersen T (2024). _patchwork: The Composer of Plots_. R package
##   version 1.2.0, <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 = {2024},
##     note = {R package version 1.2.0},
##     url = {https://CRAN.R-project.org/package=patchwork},
##   }
## 
## [[344]]
## To cite package 'pbapply' in publications use:
## 
##   Solymos P, Zawadzki Z (2023). _pbapply: Adding Progress Bar to
##   '*apply' Functions_. R package version 1.7-2,
##   <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-2},
##     url = {https://CRAN.R-project.org/package=pbapply},
##   }
## 
## [[345]]
## 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")'.
## 
## [[346]]
## 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/},
##   }
## 
## [[347]]
## To cite package 'pbmcapply' in publications use:
## 
##   Kuang K, Kong Q, Napolitano F (2022). _pbmcapply: Tracking the
##   Progress of Mc*pply with Progress Bar_. R package version 1.5.1,
##   <https://CRAN.R-project.org/package=pbmcapply>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {pbmcapply: Tracking the Progress of Mc*pply with Progress Bar},
##     author = {Kevin Kuang and Quyu Kong and Francesco Napolitano},
##     year = {2022},
##     note = {R package version 1.5.1},
##     url = {https://CRAN.R-project.org/package=pbmcapply},
##   }
## 
## ATTENTION: This citation information has been auto-generated from the
## package DESCRIPTION file and may need manual editing, see
## 'help("citation")'.
## 
## [[348]]
## To cite package 'pdftools' in publications use:
## 
##   Ooms J (2023). _pdftools: Text Extraction, Rendering and Converting
##   of PDF Documents_. R package version 3.4.0,
##   <https://CRAN.R-project.org/package=pdftools>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {pdftools: Text Extraction, Rendering and Converting of PDF Documents},
##     author = {Jeroen Ooms},
##     year = {2023},
##     note = {R package version 3.4.0},
##     url = {https://CRAN.R-project.org/package=pdftools},
##   }
## 
## [[349]]
## 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},
##   }
## 
## [[350]]
## 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},
##   }
## 
## [[351]]
## 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},
##   }
## 
## [[352]]
## To cite package 'pkgbuild' in publications use:
## 
##   Wickham H, Hester J, Csárdi G (2024). _pkgbuild: Find Tools Needed to
##   Build R Packages_. R package version 1.4.4,
##   <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 = {2024},
##     note = {R package version 1.4.4},
##     url = {https://CRAN.R-project.org/package=pkgbuild},
##   }
## 
## [[353]]
## 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")'.
## 
## [[354]]
## To cite package 'pkgload' in publications use:
## 
##   Wickham H, Chang W, Hester J, Henry L (2024). _pkgload: Simulate
##   Package Installation and Attach_. R package version 1.3.4,
##   <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 = {2024},
##     note = {R package version 1.3.4},
##     url = {https://CRAN.R-project.org/package=pkgload},
##   }
## 
## [[355]]
## To cite package 'PKI' in publications use:
## 
##   Urbanek S (2022). _PKI: Public Key Infrastucture for R Based on the
##   X.509 Standard_. R package version 0.1-12,
##   <https://CRAN.R-project.org/package=PKI>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {PKI: Public Key Infrastucture for R Based on the X.509 Standard},
##     author = {Simon Urbanek},
##     year = {2022},
##     note = {R package version 0.1-12},
##     url = {https://CRAN.R-project.org/package=PKI},
##   }
## 
## ATTENTION: This citation information has been auto-generated from the
## package DESCRIPTION file and may need manual editing, see
## 'help("citation")'.
## 
## [[356]]
## To cite package '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},
##   }
## 
## [[357]]
## To cite package 'plotmo' in publications use:
## 
##   Milborrow S (2024). _plotmo: Plot a Model's Residuals, Response, and
##   Partial Dependence Plots_. R package version 3.6.3,
##   <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 = {2024},
##     note = {R package version 3.6.3},
##     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")'.
## 
## [[358]]
## 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},
##   }
## 
## [[359]]
## To cite package 'pls' in publications use:
## 
##   Liland K, Mevik B, Wehrens R (2023). _pls: Partial Least Squares and
##   Principal Component Regression_. R package version 2.8-3,
##   <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 = {2023},
##     note = {R package version 2.8-3},
##     url = {https://CRAN.R-project.org/package=pls},
##   }
## 
## [[360]]
## To cite package '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/},
##   }
## 
## [[361]]
## 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")'.
## 
## [[362]]
## To cite package 'polyclip' in publications use:
## 
##   Johnson A, Baddeley A (2023). _polyclip: Polygon Clipping_. R package
##   version 1.10-6, <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 = {2023},
##     note = {R package version 1.10-6},
##     url = {https://CRAN.R-project.org/package=polyclip},
##   }
## 
## [[363]]
## 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},
##   }
## 
## [[364]]
## To cite the posterior R package:
## 
##   Bürkner P, Gabry J, Kay M, Vehtari A (2023). "posterior: Tools for
##   Working with Posterior Distributions." R package version 1.5.0,
##   <https://mc-stan.org/posterior/>.
## 
## To cite the MCMC convergence diagnostics:
## 
##   Vehtari A, Gelman A, Simpson D, Carpenter B, Bürkner P (2021).
##   "Rank-normalization, folding, and localization: An improved Rhat for
##   assessing convergence of MCMC (with discussion)." _Bayesian
##   Analysis_.
## 
## To see these entries in BibTeX format, use 'print(<citation>,
## bibtex=TRUE)', 'toBibtex(.)', or set
## 'options(citation.bibtex.max=999)'.
## 
## [[365]]
## To cite package 'pracma' in publications use:
## 
##   Borchers H (2023). _pracma: Practical Numerical Math Functions_. R
##   package version 2.4.4, <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 = {2023},
##     note = {R package version 2.4.4},
##     url = {https://CRAN.R-project.org/package=pracma},
##   }
## 
## [[366]]
## 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")'.
## 
## [[367]]
## 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},
##   }
## 
## [[368]]
## 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},
##   }
## 
## [[369]]
## To cite package 'processx' in publications use:
## 
##   Csárdi G, Chang W (2024). _processx: Execute and Control System
##   Processes_. R package version 3.8.4,
##   <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 = {2024},
##     note = {R package version 3.8.4},
##     url = {https://CRAN.R-project.org/package=processx},
##   }
## 
## [[370]]
## To cite package 'prodlim' in publications use:
## 
##   Gerds TA (2023). _prodlim: Product-Limit Estimation for Censored
##   Event History Analysis_. R package version 2023.08.28,
##   <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 = {2023},
##     note = {R package version 2023.08.28},
##     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")'.
## 
## [[371]]
## To cite package 'progress' in publications use:
## 
##   Csárdi G, FitzJohn R (2023). _progress: Terminal Progress Bars_. R
##   package version 1.2.3, <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 = {2023},
##     note = {R package version 1.2.3},
##     url = {https://CRAN.R-project.org/package=progress},
##   }
## 
## [[372]]
## To cite package 'progressr' in publications use:
## 
##   Bengtsson H (2023). _progressr: An Inclusive, Unifying API for
##   Progress Updates_. R package version 0.14.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.14.0},
##     url = {https://CRAN.R-project.org/package=progressr},
##   }
## 
## [[373]]
## To cite package 'promises' in publications use:
## 
##   Cheng J (2024). _promises: Abstractions for Promise-Based
##   Asynchronous Programming_. R package version 1.3.0,
##   <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 = {2024},
##     note = {R package version 1.3.0},
##     url = {https://CRAN.R-project.org/package=promises},
##   }
## 
## [[374]]
## 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},
##   }
## 
## [[375]]
## 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},
##   }
## 
## [[376]]
## 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)'.
## 
## [[377]]
## To cite package 'ps' in publications use:
## 
##   Loden J, Daeschler D, Rodola' G, Csárdi G (2024). _ps: List, Query,
##   Manipulate System Processes_. R package version 1.7.6,
##   <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 = {2024},
##     note = {R package version 1.7.6},
##     url = {https://CRAN.R-project.org/package=ps},
##   }
## 
## [[378]]
## To cite pscl/ideal in publications use
## 
##   Simon Jackman (2024). pscl: Classes and Methods for R Developed in
##   the Political Science Computational Laboratory. Sydney, Australia. R
##   package version 1.5.9. 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)'.
## 
## [[379]]
## To cite package 'psych' in publications use:
## 
##   William Revelle (2024). _psych: Procedures for Psychological,
##   Psychometric, and Personality Research_. Northwestern University,
##   Evanston, Illinois. R package version 2.4.3,
##   <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 = {2024},
##     note = {R package version 2.4.3},
##     url = {https://CRAN.R-project.org/package=psych},
##   }
## 
## [[380]]
## 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},
##   }
## 
## [[381]]
## To cite package 'qap' in publications use:
## 
##   Hahsler M (2022). _qap: Heuristics for the Quadratic Assignment
##   Problem (QAP)_. R package version 0.1-2,
##   <https://CRAN.R-project.org/package=qap>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {qap: Heuristics for the Quadratic Assignment Problem (QAP)},
##     author = {Michael Hahsler},
##     year = {2022},
##     note = {R package version 0.1-2},
##     url = {https://CRAN.R-project.org/package=qap},
##   }
## 
## [[382]]
## 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/},
##   }
## 
## [[383]]
## To cite qgraph in publications use:
## 
##   Sacha Epskamp, Angelique O. J. Cramer, Lourens J. Waldorp, Verena D.
##   Schmittmann, Denny Borsboom (2012). qgraph: Network Visualizations of
##   Relationships in Psychometric Data. Journal of Statistical Software,
##   48(4), 1-18. URL http://www.jstatsoft.org/v48/i04/.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Article{,
##     title = {{qgraph}: Network Visualizations of Relationships in Psychometric Data},
##     author = {Sacha Epskamp and Ang\'elique O. J. Cramer and Lourens J. Waldorp and Verena D. Schmittmann and Denny Borsboom},
##     journal = {Journal of Statistical Software},
##     year = {2012},
##     volume = {48},
##     number = {4},
##     pages = {1--18},
##   }
## 
## [[384]]
## To cite package 'qpdf' in publications use:
## 
##   Ooms J (2024). _qpdf: Split, Combine and Compress PDF Files_. R
##   package version 1.3.3, <https://CRAN.R-project.org/package=qpdf>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {qpdf: Split, Combine and Compress PDF Files},
##     author = {Jeroen Ooms},
##     year = {2024},
##     note = {R package version 1.3.3},
##     url = {https://CRAN.R-project.org/package=qpdf},
##   }
## 
## [[385]]
## To cite qqconf in publications use:
## 
##   Weine E, McPeek MS, Abney M (2023). "Application of Equal Local
##   Levels to Improve Q-Q Plot Testing Bands with R Package qqconf."
##   _Journal of Statistical Software_, *106*(10), 1-31.
##   doi:10.18637/jss.v106.i10 <https://doi.org/10.18637/jss.v106.i10>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Article{,
##     title = {Application of Equal Local Levels to Improve {Q}-{Q} Plot Testing Bands with {R} Package {qqconf}},
##     author = {Eric Weine and Mary Sara McPeek and Mark Abney},
##     journal = {Journal of Statistical Software},
##     year = {2023},
##     volume = {106},
##     number = {10},
##     pages = {1--31},
##     doi = {10.18637/jss.v106.i10},
##   }
## 
## [[386]]
## 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},
##   }
## 
## [[387]]
## 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")'.
## 
## [[388]]
## To cite package 'quantmod' in publications use:
## 
##   Ryan JA, Ulrich JM (2024). _quantmod: Quantitative Financial
##   Modelling Framework_. R package version 0.4.26,
##   <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 = {2024},
##     note = {R package version 0.4.26},
##     url = {https://CRAN.R-project.org/package=quantmod},
##   }
## 
## [[389]]
## To cite package 'quantreg' in publications use:
## 
##   Koenker R (2023). _quantreg: Quantile Regression_. R package version
##   5.97, <https://CRAN.R-project.org/package=quantreg>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {quantreg: Quantile Regression},
##     author = {Roger Koenker},
##     year = {2023},
##     note = {R package version 5.97},
##     url = {https://CRAN.R-project.org/package=quantreg},
##   }
## 
## [[390]]
## To cite package 'queueing' in publications use:
## 
##   Canadilla P (2019). _queueing: Analysis of Queueing Networks and
##   Models_. R package version 0.2.12,
##   <https://CRAN.R-project.org/package=queueing>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {{queueing}: Analysis of Queueing Networks and Models},
##     author = {Pedro Canadilla},
##     year = {2019},
##     note = {R package version 0.2.12},
##     url = {https://CRAN.R-project.org/package=queueing},
##   }
## 
## [[391]]
## To cite package 'QuickJSR' in publications use:
## 
##   Johnson AR (2024). _QuickJSR: Interface for the 'QuickJS' Lightweight
##   'JavaScript' Engine_. R package version 1.1.3,
##   <https://CRAN.R-project.org/package=QuickJSR>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {QuickJSR: Interface for the 'QuickJS' Lightweight 'JavaScript' Engine},
##     author = {Andrew R. Johnson},
##     year = {2024},
##     note = {R package version 1.1.3},
##     url = {https://CRAN.R-project.org/package=QuickJSR},
##   }
## 
## [[392]]
## 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/},
##   }
## 
## [[393]]
## 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/},
##   }
## 
## [[394]]
## To cite package 'R.utils' in publications use:
## 
##   Bengtsson H (2023). _R.utils: Various Programming Utilities_. R
##   package version 2.12.3, <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 = {2023},
##     note = {R package version 2.12.3},
##     url = {https://CRAN.R-project.org/package=R.utils},
##   }
## 
## [[395]]
## 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},
##   }
## 
## [[396]]
## To cite package 'ragg' in publications use:
## 
##   Pedersen T, Shemanarev M (2024). _ragg: Graphic Devices Based on
##   AGG_. R package version 1.3.2,
##   <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 = {2024},
##     note = {R package version 1.3.2},
##     url = {https://CRAN.R-project.org/package=ragg},
##   }
## 
## [[397]]
## 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/},
##   }
## 
## [[398]]
## 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")'.
## 
## [[399]]
## 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},
##   }
## 
## [[400]]
## 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},
##   }
## 
## [[401]]
## To cite package 'raster' in publications use:
## 
##   Hijmans R (2023). _raster: Geographic Data Analysis and Modeling_. R
##   package version 3.6-26, <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-26},
##     url = {https://CRAN.R-project.org/package=raster},
##   }
## 
## [[402]]
## To cite package 'rCBA' in publications use:
## 
##   Kuchar J (2019). _rCBA: CBA Classifier_. R package version 0.4.3,
##   <https://CRAN.R-project.org/package=rCBA>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {rCBA: CBA Classifier},
##     author = {Jaroslav Kuchar},
##     year = {2019},
##     note = {R package version 0.4.3},
##     url = {https://CRAN.R-project.org/package=rCBA},
##   }
## 
## [[403]]
## 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},
##   }
## 
## [[404]]
## 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)'.
## 
## [[405]]
## To cite package 'RcppArmadillo' in publications use:
## 
##   Eddelbuettel D, Francois R, Bates D, Ni B, Sanderson C (2024).
##   _RcppArmadillo: 'Rcpp' Integration for the 'Armadillo' Templated
##   Linear Algebra Library_. R package version 0.12.8.3.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)'.
## 
## [[406]]
## To cite package 'RcppEigen' in publications use:
## 
##   Bates D, Eddelbuettel D (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
##   <https://doi.org/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},
##   }
## 
## [[407]]
## To cite the 'RcppEnsmallen' R package and 'Ensmallen' libray in
## publications, please use:
## 
##   Balamuta, J.J. and Eddelbuettel, D. (2018) RcppEnsmallen: Header-Only
##   C++ Mathematical Optimization Library for 'Armadillo'. URL
##   https://cran.r-project.org/package=RcppEnsmallen.
## 
##   S. Bhardwaj, R. Curtin, M. Edel, Y. Mentekidis, and C. Sanderson
##   (2018). ensmallen: a flexible C++ library for efficient function
##   optimization. Workshop on Systems for ML and Open Source Software at
##   NIPS 2018. URL http://www.ensmallen.org/files/ensmallen_2018.pdf.
## 
## To see these entries in BibTeX format, use 'print(<citation>,
## bibtex=TRUE)', 'toBibtex(.)', or set
## 'options(citation.bibtex.max=999)'.
## 
## [[408]]
## To cite package 'RcppParallel' in publications use:
## 
##   Allaire J, Francois R, Ushey K, Vandenbrouck G, Geelnard M, Intel
##   (2023). _RcppParallel: Parallel Programming Tools for 'Rcpp'_. R
##   package version 5.1.7,
##   <https://CRAN.R-project.org/package=RcppParallel>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {RcppParallel: Parallel Programming Tools for 'Rcpp'},
##     author = {JJ Allaire and Romain Francois and Kevin Ushey and Gregory Vandenbrouck and Marcus Geelnard and {Intel}},
##     year = {2023},
##     note = {R package version 5.1.7},
##     url = {https://CRAN.R-project.org/package=RcppParallel},
##   }
## 
## [[409]]
## To cite package 'RcppTOML' in publications use:
## 
##   Eddelbuettel D (2023). _RcppTOML: 'Rcpp' Bindings to Parser for
##   "Tom's Obvious Markup Language"_. R package version 0.2.2,
##   <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 = {2023},
##     note = {R package version 0.2.2},
##     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")'.
## 
## [[410]]
## To cite package 'RCurl' in publications use:
## 
##   Temple Lang D (2024). _RCurl: General Network (HTTP/FTP/...) Client
##   Interface for R_. R package version 1.98-1.14,
##   <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 = {2024},
##     note = {R package version 1.98-1.14},
##     url = {https://CRAN.R-project.org/package=RCurl},
##   }
## 
## [[411]]
## To cite package 'readbitmap' in publications use:
## 
##   Jefferis G (2018). _readbitmap: Simple Unified Interface to Read
##   Bitmap Images (BMP,JPEG,PNG,TIFF)_. R package version 0.1.5,
##   <https://CRAN.R-project.org/package=readbitmap>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {readbitmap: Simple Unified Interface to Read Bitmap Images
## (BMP,JPEG,PNG,TIFF)},
##     author = {Gregory Jefferis},
##     year = {2018},
##     note = {R package version 0.1.5},
##     url = {https://CRAN.R-project.org/package=readbitmap},
##   }
## 
## [[412]]
## To cite package 'readODS' in publications use:
## 
##   Schutten G, Chan C, Brohan P, Steuer D, Leeper T (2024). _readODS:
##   Read and Write ODS Files_. R package version 2.2.0,
##   <https://CRAN.R-project.org/package=readODS>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {readODS: Read and Write ODS Files},
##     author = {Gerrit-Jan Schutten and Chung-hong Chan and Peter Brohan and Detlef Steuer and Thomas J. Leeper},
##     year = {2024},
##     note = {R package version 2.2.0},
##     url = {https://CRAN.R-project.org/package=readODS},
##   }
## 
## [[413]]
## 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},
##   }
## 
## [[414]]
## To cite package 'readtext' in publications use:
## 
##   Benoit K, Obeng A (2024). _readtext: Import and Handling for Plain
##   and Formatted Text Files_. R package version 0.91,
##   <https://CRAN.R-project.org/package=readtext>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {readtext: Import and Handling for Plain and Formatted Text Files},
##     author = {Kenneth Benoit and Adam Obeng},
##     year = {2024},
##     note = {R package version 0.91},
##     url = {https://CRAN.R-project.org/package=readtext},
##   }
## 
## [[415]]
## 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},
##   }
## 
## [[416]]
## To cite package 'recipes' in publications use:
## 
##   Kuhn M, Wickham H, Hvitfeldt E (2024). _recipes: Preprocessing and
##   Feature Engineering Steps for Modeling_. R package version 1.0.10,
##   <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 and Emil Hvitfeldt},
##     year = {2024},
##     note = {R package version 1.0.10},
##     url = {https://CRAN.R-project.org/package=recipes},
##   }
## 
## [[417]]
## 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")'.
## 
## [[418]]
## To cite package 'rematch' in publications use:
## 
##   Csardi G (2023). _rematch: Match Regular Expressions with a Nicer
##   'API'_. R package version 2.0.0,
##   <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 = {2023},
##     note = {R package version 2.0.0},
##     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")'.
## 
## [[419]]
## 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},
##   }
## 
## [[420]]
## To cite package 'remotes' in publications use:
## 
##   Csárdi G, Hester J, Wickham H, Chang W, Morgan M, Tenenbaum D (2024).
##   _remotes: R Package Installation from Remote Repositories, Including
##   'GitHub'_. R package version 2.5.0,
##   <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 = {2024},
##     note = {R package version 2.5.0},
##     url = {https://CRAN.R-project.org/package=remotes},
##   }
## 
## [[421]]
## To cite package 'renv' in publications use:
## 
##   Ushey K, Wickham H (2024). _renv: Project Environments_. R package
##   version 1.0.7, <https://CRAN.R-project.org/package=renv>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {renv: Project Environments},
##     author = {Kevin Ushey and Hadley Wickham},
##     year = {2024},
##     note = {R package version 1.0.7},
##     url = {https://CRAN.R-project.org/package=renv},
##   }
## 
## [[422]]
## To cite package 'reprex' in publications use:
## 
##   Bryan J, Hester J, Robinson D, Wickham H, Dervieux C (2024). _reprex:
##   Prepare Reproducible Example Code via the Clipboard_. R package
##   version 2.1.0, <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 = {2024},
##     note = {R package version 2.1.0},
##     url = {https://CRAN.R-project.org/package=reprex},
##   }
## 
## [[423]]
## 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/},
##   }
## 
## [[424]]
## To cite package 'ResourceSelection' in publications use:
## 
##   Lele SR, Keim JL, Solymos P (2023). _ResourceSelection: Resource
##   Selection (Probability) Functions for Use-Availability Data_. R
##   package version 0.3-6,
##   <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 = {2023},
##     note = {R package version 0.3-6},
##     url = {https://CRAN.R-project.org/package=ResourceSelection},
##   }
## 
## [[425]]
## To cite package 'reticulate' in publications use:
## 
##   Ushey K, Allaire J, Tang Y (2024). _reticulate: Interface to
##   'Python'_. R package version 1.37.0,
##   <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 = {2024},
##     note = {R package version 1.37.0},
##     url = {https://CRAN.R-project.org/package=reticulate},
##   }
## 
## [[426]]
## To cite package 'rgl' in publications use:
## 
##   Murdoch D, Adler D (2024). _rgl: 3D Visualization Using OpenGL_. R
##   package version 1.3.1, <https://CRAN.R-project.org/package=rgl>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {rgl: 3D Visualization Using OpenGL},
##     author = {Duncan Murdoch and Daniel Adler},
##     year = {2024},
##     note = {R package version 1.3.1},
##     url = {https://CRAN.R-project.org/package=rgl},
##   }
## 
## [[427]]
## 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 https://doi.org/10.18637/jss.v063.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 = {https://doi.org/10.18637/jss.v063.i04},
##   }
## 
## [[428]]
## To cite package 'Rgraphviz' in publications use:
## 
##   Hansen KD, Gentry J, Long L, Gentleman R, Falcon S, Hahne F, Sarkar D
##   (2023). _Rgraphviz: Provides plotting capabilities for R graph
##   objects_. doi:10.18129/B9.bioc.Rgraphviz
##   <https://doi.org/10.18129/B9.bioc.Rgraphviz>, R package version
##   2.46.0, <https://bioconductor.org/packages/Rgraphviz>.
## 
## 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 = {2023},
##     note = {R package version 2.46.0},
##     url = {https://bioconductor.org/packages/Rgraphviz},
##     doi = {10.18129/B9.bioc.Rgraphviz},
##   }
## 
## [[429]]
## To cite package 'rJava' in publications use:
## 
##   Urbanek S (2024). _rJava: Low-Level R to Java Interface_. R package
##   version 1.0-11, <https://CRAN.R-project.org/package=rJava>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {rJava: Low-Level R to Java Interface},
##     author = {Simon Urbanek},
##     year = {2024},
##     note = {R package version 1.0-11},
##     url = {https://CRAN.R-project.org/package=rJava},
##   }
## 
## 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 '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")'.
## 
## [[431]]
## RJSplot is published in this article:
## 
##   Barrios D and Prieto C, RJSplot: Interactive Graphs With R Molecular
##   Informatics 2017, doi:10.1002/minf.201700090
## 
## A BibTeX entry for LaTeX users is
## 
##   @Article{,
##     author = {David Barrios and Carlos Prieto},
##     title = {RJSplot: Interactive Graphs With R},
##     journal = {Molecular Informatics},
##     year = {2018},
##     doi = {10.1002/minf.201700090},
##     url = {http://dx.doi.org/10.1002/minf.201700090},
##     issn = {1868-1751},
##     keywords = {Data visualization, D3, R, Bioinformatics analysis},
##     pubmedid = {28980447},
##   }
## 
## Please cite us when using it for data visualization.
## 
## [[432]]
## 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},
##   }
## 
## [[433]]
## 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 (2024). _rmarkdown:
##   Dynamic Documents for R_. R package version 2.27,
##   <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)'.
## 
## [[434]]
## To cite package 'Rmisc' in publications use:
## 
##   Hope RM (2022). _Rmisc: Ryan Miscellaneous_. R package version 1.5.1,
##   <https://CRAN.R-project.org/package=Rmisc>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {Rmisc: Ryan Miscellaneous},
##     author = {Ryan M. Hope},
##     year = {2022},
##     note = {R package version 1.5.1},
##     url = {https://CRAN.R-project.org/package=Rmisc},
##   }
## 
## ATTENTION: This citation information has been auto-generated from the
## package DESCRIPTION file and may need manual editing, see
## 'help("citation")'.
## 
## [[435]]
## 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
##   (2024). robustbase: Basic Robust Statistics R package version 0.99-2.
##   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)'.
## 
## [[436]]
## To cite package 'rockchalk' in publications use:
## 
##   Johnson P (2022). _rockchalk: Regression Estimation and
##   Presentation_. R package version 1.8.157,
##   <https://CRAN.R-project.org/package=rockchalk>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {rockchalk: Regression Estimation and Presentation},
##     author = {Paul E. Johnson},
##     year = {2022},
##     note = {R package version 1.8.157},
##     url = {https://CRAN.R-project.org/package=rockchalk},
##   }
## 
## [[437]]
## 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.
## 
## [[438]]
## To cite package 'ROI' in publications use:
## 
##   Hornik K, Meyer D, Schwendinger F, Theussl S (2023). _ROI: R
##   Optimization Infrastructure_. R package version 1.0-1,
##   <https://CRAN.R-project.org/package=ROI>.
## 
##   Theußl, S., Schwendinger, F., & Hornik, K. (2020). ROI: An Extensible
##   R Optimization Infrastructure. Journal of Statistical Software,
##   94(15), 1–64. https://doi.org/10.18637/jss.v094.i15
## 
## To see these entries in BibTeX format, use 'print(<citation>,
## bibtex=TRUE)', 'toBibtex(.)', or set
## 'options(citation.bibtex.max=999)'.
## 
## [[439]]
## To cite package 'ROI.plugin.lpsolve' in publications use:
## 
##   Schwendinger F (2023). _ROI.plugin.lpsolve: 'lp_solve' Plugin for the
##   'R' Optimization Infrastructure_. R package version 1.0-2,
##   <https://CRAN.R-project.org/package=ROI.plugin.lpsolve>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {ROI.plugin.lpsolve: 'lp_solve' Plugin for the 'R' Optimization Infrastructure},
##     author = {Florian Schwendinger},
##     year = {2023},
##     note = {R package version 1.0-2},
##     url = {https://CRAN.R-project.org/package=ROI.plugin.lpsolve},
##   }
## 
## [[440]]
## To cite package 'rootSolve' in publications use:
## 
##   Soetaert K. and P.M.J. Herman (2009).  A Practical Guide to
##   Ecological Modelling. Using R as a Simulation Platform.  Springer,
##   372 pp.
## 
##   Soetaert K. (2009).  rootSolve: Nonlinear root finding, equilibrium
##   and steady-state analysis of ordinary differential equations.
##   R-package version 1.6
## 
## rootSolve was created to solve the examples from chapter 7 of our book
## - please cite this book when using it, thank you!
## 
## To see these entries in BibTeX format, use 'print(<citation>,
## bibtex=TRUE)', 'toBibtex(.)', or set
## 'options(citation.bibtex.max=999)'.
## 
## [[441]]
## To cite package 'rpart' in publications use:
## 
##   Therneau T, Atkinson B (2023). _rpart: Recursive Partitioning and
##   Regression Trees_. R package version 4.1.21,
##   <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 = {2023},
##     note = {R package version 4.1.21},
##     url = {https://CRAN.R-project.org/package=rpart},
##   }
## 
## [[442]]
## 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")'.
## 
## [[443]]
## To cite package 'rpf' in publications use:
## 
##   Pritikin J (2023). _rpf: Response Probability Functions_. R package
##   version 1.0.14, <https://CRAN.R-project.org/package=rpf>.
## 
##   Pritikin, J. N., & Falk, C. F. (2020). OpenMx: A modular research
##   environment for item response theory methods development. Applied
##   Psychological Measurement, 44(7-8), 561-562.
##   doi:10.1177/0146621620929431
## 
## To see these entries in BibTeX format, use 'print(<citation>,
## bibtex=TRUE)', 'toBibtex(.)', or set
## 'options(citation.bibtex.max=999)'.
## 
## [[444]]
## 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},
##   }
## 
## [[445]]
## To cite package 'rsample' in publications use:
## 
##   Frick H, Chow F, Kuhn M, Mahoney M, Silge J, Wickham H (2024).
##   _rsample: General Resampling Infrastructure_. R package version
##   1.2.1, <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 = {2024},
##     note = {R package version 1.2.1},
##     url = {https://CRAN.R-project.org/package=rsample},
##   }
## 
## [[446]]
## To cite package 'rsconnect' in publications use:
## 
##   Atkins A, Allen T, Wickham H, McPherson J, Allaire J (2024).
##   _rsconnect: Deploy Docs, Apps, and APIs to 'Posit Connect',
##   'shinyapps.io', and 'RPubs'_. R package version 1.2.2,
##   <https://CRAN.R-project.org/package=rsconnect>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {rsconnect: Deploy Docs, Apps, and APIs to 'Posit Connect', 'shinyapps.io',
## and 'RPubs'},
##     author = {Aron Atkins and Toph Allen and Hadley Wickham and Jonathan McPherson and JJ Allaire},
##     year = {2024},
##     note = {R package version 1.2.2},
##     url = {https://CRAN.R-project.org/package=rsconnect},
##   }
## 
## [[447]]
## To cite RStan in publications use:
## 
##   Stan Development Team (2024). RStan: the R interface to Stan. R
##   package version 2.32.6. https://mc-stan.org/.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Misc{,
##     title = {{RStan}: the {R} interface to {Stan}},
##     author = {{Stan Development Team}},
##     note = {R package version 2.32.6},
##     year = {2024},
##     url = {https://mc-stan.org/},
##   }
## 
## [[448]]
## To cite package 'rstantools' in publications use:
## 
##   Gabry J, Goodrich B, Lysy M, Johnson A (2024). _rstantools: Tools for
##   Developing R Packages Interfacing with 'Stan'_. R package version
##   2.4.0, <https://CRAN.R-project.org/package=rstantools>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {rstantools: Tools for Developing R Packages Interfacing with 'Stan'},
##     author = {Jonah Gabry and Ben Goodrich and Martin Lysy and Andrew Johnson},
##     year = {2024},
##     note = {R package version 2.4.0},
##     url = {https://CRAN.R-project.org/package=rstantools},
##   }
## 
## [[449]]
## To cite package 'rstatix' in publications use:
## 
##   Kassambara A (2023). _rstatix: Pipe-Friendly Framework for Basic
##   Statistical Tests_. R package version 0.7.2,
##   <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 = {2023},
##     note = {R package version 0.7.2},
##     url = {https://CRAN.R-project.org/package=rstatix},
##   }
## 
## [[450]]
## To cite package 'rstudioapi' in publications use:
## 
##   Ushey K, Allaire J, Wickham H, Ritchie G (2024). _rstudioapi: Safely
##   Access the RStudio API_. R package version 0.16.0,
##   <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 = {2024},
##     note = {R package version 0.16.0},
##     url = {https://CRAN.R-project.org/package=rstudioapi},
##   }
## 
## [[451]]
## To cite package 'rules' in publications use:
## 
##   Hvitfeldt E, Kuhn M (2023). _rules: Model Wrappers for Rule-Based
##   Models_. R package version 1.0.2,
##   <https://CRAN.R-project.org/package=rules>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {rules: Model Wrappers for Rule-Based Models},
##     author = {Emil Hvitfeldt and Max Kuhn},
##     year = {2023},
##     note = {R package version 1.0.2},
##     url = {https://CRAN.R-project.org/package=rules},
##   }
## 
## [[452]]
## To cite package 'RUnit' in publications use:
## 
##   Burger M, Juenemann K, Koenig T (2024). _RUnit: R Unit Test
##   Framework_. R package version 0.4.33,
##   <https://CRAN.R-project.org/package=RUnit>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {RUnit: R Unit Test Framework},
##     author = {Matthias Burger and Klaus Juenemann and Thomas Koenig},
##     year = {2024},
##     note = {R package version 0.4.33},
##     url = {https://CRAN.R-project.org/package=RUnit},
##   }
## 
## ATTENTION: This citation information has been auto-generated from the
## package DESCRIPTION file and may need manual editing, see
## 'help("citation")'.
## 
## [[453]]
## To cite package 'rvest' in publications use:
## 
##   Wickham H (2024). _rvest: Easily Harvest (Scrape) Web Pages_. R
##   package version 1.0.4, <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 = {2024},
##     note = {R package version 1.0.4},
##     url = {https://CRAN.R-project.org/package=rvest},
##   }
## 
## [[454]]
## To cite the 'Ryacas' package in publications use:
## 
##   Andersen MM, Højsgaard S (2019). Ryacas: A computer algebra system in
##   R. Journal of Open Source Software, 4(42), 1763, URL
##   https://doi.org/10.21105/joss.01763
## 
## A BibTeX entry for LaTeX users is
## 
##   @Article{,
##     title = {{Ryacas: A computer algebra system in R}},
##     author = {Mikkel Meyer Andersen and Søren Højsgaard},
##     journal = {Journal of Open Source Software},
##     year = {2019},
##     volume = {4},
##     number = {42},
##     url = {https://doi.org/10.21105/joss.01763},
##   }
## 
## [[455]]
## 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.6,
##   <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.6},
##     url = {https://CRAN.R-project.org/package=s2},
##   }
## 
## [[456]]
## To cite s2net in publications use:
## 
##   Laria, C. J, Clemmensen, H. L, Ersbol, K. B, Delgado-Gomez, David
##   (2022). "A generalized linear joint trained framework for
##   semi-supervised learning of sparse features." _Mathematics_,
##   *10*(16), 3001. doi:10.3390/math10163001
##   <https://doi.org/10.3390/math10163001>,
##   <https://doi.org/10.3390/math10163001>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Article{,
##     title = {A generalized linear joint trained framework for semi-supervised learning of sparse features},
##     author = {{Laria} and Juan C. and {Clemmensen} and Line H. and {Ersbol} and Bjarne K. and {Delgado-Gomez} and {David}},
##     journal = {Mathematics},
##     year = {2022},
##     volume = {10},
##     number = {16},
##     pages = {3001},
##     url = {https://doi.org/10.3390/math10163001},
##     doi = {10.3390/math10163001},
##   }
## 
## [[457]]
## To cite package 'sampling' in publications use:
## 
##   Tillé Y, Matei A (2023). _sampling: Survey Sampling_. R package
##   version 2.10, <https://CRAN.R-project.org/package=sampling>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {sampling: Survey Sampling},
##     author = {Yves Tillé and Alina Matei},
##     year = {2023},
##     note = {R package version 2.10},
##     url = {https://CRAN.R-project.org/package=sampling},
##   }
## 
## ATTENTION: This citation information has been auto-generated from the
## package DESCRIPTION file and may need manual editing, see
## 'help("citation")'.
## 
## [[458]]
## 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)'.
## 
## [[459]]
## To cite package 'sass' in publications use:
## 
##   Cheng J, Mastny T, Iannone R, Schloerke B, Sievert C (2024). _sass:
##   Syntactically Awesome Style Sheets ('Sass')_. R package version
##   0.4.9, <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 = {2024},
##     note = {R package version 0.4.9},
##     url = {https://CRAN.R-project.org/package=sass},
##   }
## 
## [[460]]
## To cite package 'scales' in publications use:
## 
##   Wickham H, Pedersen T, Seidel D (2023). _scales: Scale Functions for
##   Visualization_. R package version 1.3.0,
##   <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 Thomas Lin Pedersen and Dana Seidel},
##     year = {2023},
##     note = {R package version 1.3.0},
##     url = {https://CRAN.R-project.org/package=scales},
##   }
## 
## [[461]]
## 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},
##   }
## 
## [[462]]
## To cite package 'scorecard' in publications use:
## 
##   Xie S (2024). _scorecard: Credit Risk Scorecard_. R package version
##   0.4.4, <https://CRAN.R-project.org/package=scorecard>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {scorecard: Credit Risk Scorecard},
##     author = {Shichen Xie},
##     year = {2024},
##     note = {R package version 0.4.4},
##     url = {https://CRAN.R-project.org/package=scorecard},
##   }
## 
## [[463]]
## 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/},
##   }
## 
## [[464]]
## To cite package 'sem' in publications use:
## 
##   Fox J, Nie Z, Byrnes J (2022). _sem: Structural Equation Models_. R
##   package version 3.1-15, <https://CRAN.R-project.org/package=sem>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {sem: Structural Equation Models},
##     author = {John Fox and Zhenghua Nie and Jarrett Byrnes},
##     year = {2022},
##     note = {R package version 3.1-15},
##     url = {https://CRAN.R-project.org/package=sem},
##   }
## 
## [[465]]
## To cite package 'semPlot' in publications use:
## 
##   Epskamp S (2022). _semPlot: Path Diagrams and Visual Analysis of
##   Various SEM Packages' Output_. R package version 1.1.6,
##   <https://CRAN.R-project.org/package=semPlot>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {semPlot: Path Diagrams and Visual Analysis of Various SEM Packages'
## Output},
##     author = {Sacha Epskamp},
##     year = {2022},
##     note = {R package version 1.1.6},
##     url = {https://CRAN.R-project.org/package=semPlot},
##   }
## 
## [[466]]
## To cite package 'seriation' in publications use:
## 
##   Hahsler M, Buchta C, Hornik K (2024). _seriation: Infrastructure for
##   Ordering Objects Using Seriation_. R package version 1.5.5,
##   <https://CRAN.R-project.org/package=seriation>.
## 
##   Hahsler M, Hornik K, Buchta C (2008). "Getting things in order: An
##   introduction to the R package seriation." _Journal of Statistical
##   Software_, *25*(3), 1-34. ISSN 1548-7660, doi:10.18637/jss.v025.i03
##   <https://doi.org/10.18637/jss.v025.i03>.
## 
##   Hahsler M (2017). "An experimental comparison of seriation methods
##   for one-mode two-way data." _European Journal of Operational
##   Research_, *257*(1), 133-143. doi:10.1016/j.ejor.2016.08.066
##   <https://doi.org/10.1016/j.ejor.2016.08.066>.
## 
## To see these entries in BibTeX format, use 'print(<citation>,
## bibtex=TRUE)', 'toBibtex(.)', or set
## 'options(citation.bibtex.max=999)'.
## 
## [[467]]
## To cite package sf in publications, please use:
## 
##   Pebesma, E., & Bivand, R. (2023). Spatial Data Science: With
##   Applications in R. Chapman and Hall/CRC.
##   https://doi.org/10.1201/9780429459016
## 
##   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
## 
## To see these entries in BibTeX format, use 'print(<citation>,
## bibtex=TRUE)', 'toBibtex(.)', or set
## 'options(citation.bibtex.max=999)'.
## 
## [[468]]
## To cite package 'sfheaders' in publications use:
## 
##   Cooley D (2024). _sfheaders: Converts Between R Objects and Simple
##   Feature Objects_. R package version 0.4.4,
##   <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 = {2024},
##     note = {R package version 0.4.4},
##     url = {https://CRAN.R-project.org/package=sfheaders},
##   }
## 
## [[469]]
## To cite package 'shape' in publications use:
## 
##   Soetaert K (2024). _shape: Functions for Plotting Graphical Shapes,
##   Colors_. R package version 1.4.6.1,
##   <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 = {2024},
##     note = {R package version 1.4.6.1},
##     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")'.
## 
## [[470]]
## 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 (2024). _shiny: Web Application
##   Framework for R_. R package version 1.8.1.1,
##   <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 = {2024},
##     note = {R package version 1.8.1.1},
##     url = {https://CRAN.R-project.org/package=shiny},
##   }
## 
## [[471]]
## To cite package 'shinyalert' in publications use:
## 
##   Attali D, Edwards T (2024). _shinyalert: Easily Create Pretty Popup
##   Messages (Modals) in 'Shiny'_. R package version 3.1.0,
##   <https://CRAN.R-project.org/package=shinyalert>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {shinyalert: Easily Create Pretty Popup Messages (Modals) in 'Shiny'},
##     author = {Dean Attali and Tristan Edwards},
##     year = {2024},
##     note = {R package version 3.1.0},
##     url = {https://CRAN.R-project.org/package=shinyalert},
##   }
## 
## [[472]]
## To cite package 'shinyBS' in publications use:
## 
##   Bailey E (2022). _shinyBS: Twitter Bootstrap Components for Shiny_. R
##   package version 0.61.1, <https://CRAN.R-project.org/package=shinyBS>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {shinyBS: Twitter Bootstrap Components for Shiny},
##     author = {Eric Bailey},
##     year = {2022},
##     note = {R package version 0.61.1},
##     url = {https://CRAN.R-project.org/package=shinyBS},
##   }
## 
## ATTENTION: This citation information has been auto-generated from the
## package DESCRIPTION file and may need manual editing, see
## 'help("citation")'.
## 
## [[473]]
## 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},
##   }
## 
## [[474]]
## To cite package 'shinysurveys' in publications use:
## 
##   Trattner J, D'Agostino McGowan L (2021). _shinysurveys: Create and
##   Deploy Surveys in 'Shiny'_. R package version 0.2.0,
##   <https://CRAN.R-project.org/package=shinysurveys>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {shinysurveys: Create and Deploy Surveys in 'Shiny'},
##     author = {Jonathan Trattner and Lucy {D'Agostino McGowan}},
##     year = {2021},
##     note = {R package version 0.2.0},
##     url = {https://CRAN.R-project.org/package=shinysurveys},
##   }
## 
## [[475]]
## To cite package 'shinythemes' in publications use:
## 
##   Chang W (2021). _shinythemes: Themes for Shiny_. R package version
##   1.2.0, <https://CRAN.R-project.org/package=shinythemes>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {shinythemes: Themes for Shiny},
##     author = {Winston Chang},
##     year = {2021},
##     note = {R package version 1.2.0},
##     url = {https://CRAN.R-project.org/package=shinythemes},
##   }
## 
## [[476]]
## To cite 'simmer' in publications use:
## 
##   Ucar I, Smeets B, Azcorra A (2019). "simmer: Discrete-Event
##   Simulation for R." _Journal of Statistical Software_, *90*(2), 1-30.
##   doi:10.18637/jss.v090.i02 <https://doi.org/10.18637/jss.v090.i02>.
## 
## If appropriate, use also:
## 
##   Ucar I, Hernández J, Serrano P, Azcorra A (2018). "Design and
##   Analysis of 5G Scenarios with simmer: An R Package for Fast DES
##   Prototyping." _IEEE Communications Magazine_, *56*(11), 145-151.
##   doi:10.1109/MCOM.2018.1700960
##   <https://doi.org/10.1109/MCOM.2018.1700960>.
## 
## To see these entries in BibTeX format, use 'print(<citation>,
## bibtex=TRUE)', 'toBibtex(.)', or set
## 'options(citation.bibtex.max=999)'.
## 
## [[477]]
## To cite package 'simmer.plot' in publications use:
## 
##   Ucar I, Smeets B (2023). _simmer.plot: Plotting Methods for
##   'simmer'_. R package version 0.1.18,
##   <https://CRAN.R-project.org/package=simmer.plot>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {simmer.plot: Plotting Methods for 'simmer'},
##     author = {Iñaki Ucar and Bart Smeets},
##     year = {2023},
##     note = {R package version 0.1.18},
##     url = {https://CRAN.R-project.org/package=simmer.plot},
##   }
## 
## [[478]]
## 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},
##   }
## 
## [[479]]
## 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},
##   }
## 
## [[480]]
## To cite package 'sjPlot' in publications use:
## 
##   Lüdecke D (2024). _sjPlot: Data Visualization for Statistics in
##   Social Science_. R package version 2.8.16,
##   <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 = {2024},
##     note = {R package version 2.8.16},
##     url = {https://CRAN.R-project.org/package=sjPlot},
##   }
## 
## [[481]]
## To cite package 'sjstats' in publications use:
## 
##   Lüdecke D (2024). _sjstats: Statistical Functions for Regression
##   Models (Version 0.19.0)_. 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.19.0)},
##     author = {Daniel Lüdecke},
##     year = {2024},
##     url = {https://CRAN.R-project.org/package=sjstats},
##     doi = {10.5281/zenodo.1284472},
##   }
## 
## [[482]]
## 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},
##   }
## 
## [[483]]
## To cite package 'slider' in publications use:
## 
##   Vaughan D (2023). _slider: Sliding Window Functions_. R package
##   version 0.3.1, <https://CRAN.R-project.org/package=slider>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {slider: Sliding Window Functions},
##     author = {Davis Vaughan},
##     year = {2023},
##     note = {R package version 0.3.1},
##     url = {https://CRAN.R-project.org/package=slider},
##   }
## 
## [[484]]
## To cite package 'SmartEDA' in publications use:
## 
##   Dayanand Ubrangala, R K, Prasad Kondapalli R, Putatunda S (2024).
##   _SmartEDA: Summarize and Explore the Data_. R package version 0.3.10,
##   <https://CRAN.R-project.org/package=SmartEDA>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {SmartEDA: Summarize and Explore the Data},
##     author = {{Dayanand Ubrangala} and Kiran R and Ravi {Prasad Kondapalli} and Sayan Putatunda},
##     year = {2024},
##     note = {R package version 0.3.10},
##     url = {https://CRAN.R-project.org/package=SmartEDA},
##   }
## 
## [[485]]
## To cite package 'smotefamily' in publications use:
## 
##   Siriseriwan W (2024). _smotefamily: A Collection of Oversampling
##   Techniques for Class Imbalance Problem Based on SMOTE_. R package
##   version 1.4.0, <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 = {2024},
##     note = {R package version 1.4.0},
##     url = {https://CRAN.R-project.org/package=smotefamily},
##   }
## 
## [[486]]
## To cite package 'snakecase' in publications use:
## 
##   Grosser M (2023). _snakecase: Convert Strings into any Case_. R
##   package version 0.11.1,
##   <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 = {2023},
##     note = {R package version 0.11.1},
##     url = {https://CRAN.R-project.org/package=snakecase},
##   }
## 
## [[487]]
## To cite package 'SnowballC' in publications use:
## 
##   Bouchet-Valat M (2023). _SnowballC: Snowball Stemmers Based on the C
##   'libstemmer' UTF-8 Library_. R package version 0.7.1,
##   <https://CRAN.R-project.org/package=SnowballC>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {SnowballC: Snowball Stemmers Based on the C 'libstemmer' UTF-8 Library},
##     author = {Milan Bouchet-Valat},
##     year = {2023},
##     note = {R package version 0.7.1},
##     url = {https://CRAN.R-project.org/package=SnowballC},
##   }
## 
## [[488]]
## 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")'.
## 
## [[489]]
## To cite package sp in publications use:
## 
##   Pebesma E, Bivand R (2005). "Classes and methods for spatial data in
##   R." _R News_, *5*(2), 9-13. <https://CRAN.R-project.org/doc/Rnews/>.
## 
##   Bivand R, Pebesma E, Gomez-Rubio V (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)'.
## 
## [[490]]
## 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},
##   }
## 
## [[491]]
## 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/},
##   }
## 
## [[492]]
## To cite spatialEco in publications use:
## 
##   Evans JS, Murphy MA (2023). _spatialEco_. R package version 2.0-2,
##   <https://github.com/jeffreyevans/spatialEco>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {spatialEco},
##     author = {Jeffrey S. Evans and Melanie A. Murphy},
##     year = {2023},
##     note = {R package version 2.0-2},
##     url = {https://github.com/jeffreyevans/spatialEco},
##     keywords = {spatialEco-package},
##   }
## 
## [[493]]
## 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)'.
## 
## [[494]]
## To cite package 'spData' in publications use:
## 
##   Bivand R, Nowosad J, Lovelace R (2023). _spData: Datasets for Spatial
##   Analysis_. R package version 2.3.0,
##   <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.3.0},
##     url = {https://CRAN.R-project.org/package=spData},
##   }
## 
## [[495]]
## 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)'.
## 
## [[496]]
## To cite package 'splitstackshape' in publications use:
## 
##   Mahto A (2019). _splitstackshape: Stack and Reshape Datasets After
##   Splitting Concatenated Values_. R package version 1.4.8,
##   <https://CRAN.R-project.org/package=splitstackshape>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {splitstackshape: Stack and Reshape Datasets After Splitting Concatenated Values},
##     author = {Ananda Mahto},
##     year = {2019},
##     note = {R package version 1.4.8},
##     url = {https://CRAN.R-project.org/package=splitstackshape},
##   }
## 
## ATTENTION: This citation information has been auto-generated from the
## package DESCRIPTION file and may need manual editing, see
## 'help("citation")'.
## 
## [[497]]
## 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},
##   }
## 
## [[498]]
## To cite package 'stacks' in publications use:
## 
##   Couch S, Kuhn M (2024). _stacks: Tidy Model Stacking_. R package
##   version 1.0.4, <https://CRAN.R-project.org/package=stacks>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {stacks: Tidy Model Stacking},
##     author = {Simon Couch and Max Kuhn},
##     year = {2024},
##     note = {R package version 1.0.4},
##     url = {https://CRAN.R-project.org/package=stacks},
##   }
## 
## [[499]]
## To cite StanHeaders in publications use:
## 
##   Stan Development Team (2018). StanHeaders: Headers for the {R}
##   interface to {Stan}. https://mc-stan.org/.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Misc{,
##     title = {{StanHeaders}: Headers for the {R} interface to {Stan}},
##     author = {{Stan Development Team}},
##     note = {R package version 2.21.0-6},
##     year = {2020},
##     url = {https://mc-stan.org/},
##   }
## 
## [[500]]
## 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},
##   }
## 
## [[501]]
## To cite package stars in publications, please use:
## 
##   Pebesma E, Bivand R (2023). _Spatial Data Science: With applications
##   in R_. Chapman and Hall/CRC, London. doi:10.1201/9780429459016
##   <https://doi.org/10.1201/9780429459016>,
##   <https://r-spatial.org/book/>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Book{,
##     title = {{Spatial Data Science: With applications in R}},
##     author = {Edzer Pebesma and Roger Bivand},
##     year = {2023},
##     publisher = {Chapman and Hall/CRC},
##     address = {London},
##     url = {https://r-spatial.org/book/},
##     pages = {352},
##     doi = {10.1201/9780429459016},
##   }
## 
## [[502]]
## To cite package 'streamR' in publications use:
## 
##   Barbera P (2018). _streamR: Access to Twitter Streaming API via R_. R
##   package version 0.4.5, <https://CRAN.R-project.org/package=streamR>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {streamR: Access to Twitter Streaming API via R},
##     author = {Pablo Barbera},
##     year = {2018},
##     note = {R package version 0.4.5},
##     url = {https://CRAN.R-project.org/package=streamR},
##   }
## 
## ATTENTION: This citation information has been auto-generated from the
## package DESCRIPTION file and may need manual editing, see
## 'help("citation")'.
## 
## [[503]]
## 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},
##   }
## 
## [[504]]
## 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},
##   }
## 
## [[505]]
## To cite package 'striprtf' in publications use:
## 
##   Mori K (2023). _striprtf: Extract Text from RTF File_. R package
##   version 0.6.0, <https://CRAN.R-project.org/package=striprtf>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {striprtf: Extract Text from RTF File},
##     author = {Kota Mori},
##     year = {2023},
##     note = {R package version 0.6.0},
##     url = {https://CRAN.R-project.org/package=striprtf},
##   }
## 
## [[506]]
## There are several publications about strucchange which describe
## different aspects of the software. The main reference is the JSS paper.
## 
## 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)'.
## 
## [[507]]
## To cite the package 'stylo' in publications use:
## 
##   Eder M, Rybicki J, Kestemont M (2016). "Stylometry with R: a package
##   for computational text analysis." _R Journal_, *8*(1), 107-121.
##   <https://journal.r-project.org/archive/2016/RJ-2016-007/index.html>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Article{,
##     title = {Stylometry with R: a package for computational text analysis},
##     author = {Maciej Eder and Jan Rybicki and Mike Kestemont},
##     journal = {R Journal},
##     year = {2016},
##     volume = {8},
##     number = {1},
##     pages = {107--121},
##     url = {https://journal.r-project.org/archive/2016/RJ-2016-007/index.html},
##   }
## 
## We have invested a lot of time and effort in creating 'stylo', please
## cite it when using it together with R. See also 'citation()' for citing
## R.
## 
## [[508]]
## To cite package 'survival' in publications use:
## 
##   Therneau T (2023). _A Package for Survival Analysis in R_. R package
##   version 3.5-7, <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)'.
## 
## [[509]]
## 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.3,
##   <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.3},
##     url = {https://CRAN.R-project.org/package=svglite},
##   }
## 
## [[510]]
## 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},
##   }
## 
## [[511]]
## To cite package 'systemfonts' in publications use:
## 
##   Pedersen T, Ooms J, Govett D (2024). _systemfonts: System Native Font
##   Finding_. R package version 1.1.0,
##   <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 = {2024},
##     note = {R package version 1.1.0},
##     url = {https://CRAN.R-project.org/package=systemfonts},
##   }
## 
## [[512]]
## To cite SciViews-R in publications use:
## 
##   Grosjean, Ph. (2023). SciViews: A GUI API for R. UMONS, Mons,
##   Belgium. URL http://www.sciviews.org/SciViews-R.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {SciViews-R: A GUI API for R},
##     author = {Philippe Grosjean},
##     organization = {UMONS},
##     address = {MONS, Belgium},
##     year = {2023},
##     url = {http://www.sciviews.org/SciViews-R},
##   }
## 
## We have invested a lot of time and effort in creating SciViews-R,
## please cite it when using it together with R. See also 'citation()' for
## citing R.
## 
## [[513]]
## To cite package 'TeachingDemos' in publications use:
## 
##   Snow G (2024). _TeachingDemos: Demonstrations for Teaching and
##   Learning_. R package version 2.13,
##   <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 = {2024},
##     note = {R package version 2.13},
##     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")'.
## 
## [[514]]
## To cite package 'tensorA' in publications use:
## 
##   van den Boogaart KG (2023). _tensorA: Advanced Tensor Arithmetic with
##   Named Indices_. R package version 0.36.2.1,
##   <https://CRAN.R-project.org/package=tensorA>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {tensorA: Advanced Tensor Arithmetic with Named Indices},
##     author = {K. Gerald {van den Boogaart}},
##     year = {2023},
##     note = {R package version 0.36.2.1},
##     url = {https://CRAN.R-project.org/package=tensorA},
##   }
## 
## ATTENTION: This citation information has been auto-generated from the
## package DESCRIPTION file and may need manual editing, see
## 'help("citation")'.
## 
## [[515]]
## To cite package 'tensorflow' in publications use:
## 
##   Allaire J, Tang Y (2024). _tensorflow: R Interface to 'TensorFlow'_.
##   R package version 2.16.0,
##   <https://CRAN.R-project.org/package=tensorflow>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {tensorflow: R Interface to 'TensorFlow'},
##     author = {JJ Allaire and Yuan Tang},
##     year = {2024},
##     note = {R package version 2.16.0},
##     url = {https://CRAN.R-project.org/package=tensorflow},
##   }
## 
## [[516]]
## To cite package 'terra' in publications use:
## 
##   Hijmans R (2023). _terra: Spatial Data Analysis_. R package version
##   1.7-55, <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-55},
##     url = {https://CRAN.R-project.org/package=terra},
##   }
## 
## [[517]]
## 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},
##   }
## 
## [[518]]
## 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 https://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 = {https://doi.org/10.18637/jss.v055.i08},
##   }
## 
## [[519]]
## To cite package 'textdata' in publications use:
## 
##   Hvitfeldt E (2022). _textdata: Download and Load Various Text
##   Datasets_. R package version 0.4.4,
##   <https://CRAN.R-project.org/package=textdata>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {textdata: Download and Load Various Text Datasets},
##     author = {Emil Hvitfeldt},
##     year = {2022},
##     note = {R package version 0.4.4},
##     url = {https://CRAN.R-project.org/package=textdata},
##   }
## 
## [[520]]
## To cite package 'textshaping' in publications use:
## 
##   Pedersen T (2023). _textshaping: Bindings to the 'HarfBuzz' and
##   'Fribidi' Libraries for Text Shaping_. R package version 0.3.7,
##   <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 = {2023},
##     note = {R package version 0.3.7},
##     url = {https://CRAN.R-project.org/package=textshaping},
##   }
## 
## [[521]]
## To cite package 'tfautograph' in publications use:
## 
##   Kalinowski T (2021). _tfautograph: Autograph R for 'Tensorflow'_. R
##   package version 0.3.2,
##   <https://CRAN.R-project.org/package=tfautograph>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {tfautograph: Autograph R for 'Tensorflow'},
##     author = {Tomasz Kalinowski},
##     year = {2021},
##     note = {R package version 0.3.2},
##     url = {https://CRAN.R-project.org/package=tfautograph},
##   }
## 
## [[522]]
## To cite package 'tfruns' in publications use:
## 
##   Allaire J (2024). _tfruns: Training Run Tools for 'TensorFlow'_. R
##   package version 1.5.3, <https://CRAN.R-project.org/package=tfruns>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {tfruns: Training Run Tools for 'TensorFlow'},
##     author = {JJ Allaire},
##     year = {2024},
##     note = {R package version 1.5.3},
##     url = {https://CRAN.R-project.org/package=tfruns},
##   }
## 
## [[523]]
## To cite package 'TH.data' in publications use:
## 
##   Hothorn T (2023). _TH.data: TH's Data Archive_. R package version
##   1.1-2, <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 = {2023},
##     note = {R package version 1.1-2},
##     url = {https://CRAN.R-project.org/package=TH.data},
##   }
## 
## [[524]]
## 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},
##   }
## 
## [[525]]
## To cite package 'tidycensus' in publications use:
## 
##   Walker K, Herman M (2024). _tidycensus: Load US Census Boundary and
##   Attribute Data as 'tidyverse' and 'sf'-Ready Data Frames_. R package
##   version 1.6.3, <https://CRAN.R-project.org/package=tidycensus>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {tidycensus: Load US Census Boundary and Attribute Data as 'tidyverse' and
## 'sf'-Ready Data Frames},
##     author = {Kyle Walker and Matt Herman},
##     year = {2024},
##     note = {R package version 1.6.3},
##     url = {https://CRAN.R-project.org/package=tidycensus},
##   }
## 
## [[526]]
## To cite package 'tidygraph' in publications use:
## 
##   Pedersen T (2024). _tidygraph: A Tidy API for Graph Manipulation_. R
##   package version 1.3.1,
##   <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 = {2024},
##     note = {R package version 1.3.1},
##     url = {https://CRAN.R-project.org/package=tidygraph},
##   }
## 
## [[527]]
## 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},
##   }
## 
## [[528]]
## 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},
##   }
## 
## [[529]]
## To cite package 'tidyselect' in publications use:
## 
##   Henry L, Wickham H (2024). _tidyselect: Select from a Set of
##   Strings_. R package version 1.2.1,
##   <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 = {2024},
##     note = {R package version 1.2.1},
##     url = {https://CRAN.R-project.org/package=tidyselect},
##   }
## 
## [[530]]
## To cite package 'tidySEM' in publications use:
## 
##   van Lissa CJ (2023). _tidySEM: Tidy Structural Equation Modeling_. R
##   package version 0.2.6, <https://CRAN.R-project.org/package=tidySEM>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {tidySEM: Tidy Structural Equation Modeling},
##     author = {Caspar J. {van Lissa}},
##     year = {2023},
##     note = {R package version 0.2.6},
##     url = {https://CRAN.R-project.org/package=tidySEM},
##   }
## 
## [[531]]
## To cite package 'tidytext' in publications use:
## 
##   Silge J, Robinson D (2016). "tidytext: Text Mining and Analysis Using
##   Tidy Data Principles in R." _JOSS_, *1*(3). doi:10.21105/joss.00037
##   <https://doi.org/10.21105/joss.00037>,
##   <http://dx.doi.org/10.21105/joss.00037>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Article{,
##     title = {tidytext: Text Mining and Analysis Using Tidy Data Principles in R},
##     author = {Julia Silge and David Robinson},
##     doi = {10.21105/joss.00037},
##     url = {http://dx.doi.org/10.21105/joss.00037},
##     year = {2016},
##     publisher = {The Open Journal},
##     volume = {1},
##     number = {3},
##     journal = {JOSS},
##   }
## 
## [[532]]
## 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},
##   }
## 
## [[533]]
## To cite package 'tiff' in publications use:
## 
##   Urbanek S, Johnson K (2023). _tiff: Read and Write TIFF Images_. R
##   package version 0.1-12, <https://CRAN.R-project.org/package=tiff>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {tiff: Read and Write TIFF Images},
##     author = {Simon Urbanek and Kent Johnson},
##     year = {2023},
##     note = {R package version 0.1-12},
##     url = {https://CRAN.R-project.org/package=tiff},
##   }
## 
## 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 'tigris' in publications use:
## 
##   Walker K (2024). _tigris: Load Census TIGER/Line Shapefiles_. R
##   package version 2.1, <https://CRAN.R-project.org/package=tigris>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {tigris: Load Census TIGER/Line Shapefiles},
##     author = {Kyle Walker},
##     year = {2024},
##     note = {R package version 2.1},
##     url = {https://CRAN.R-project.org/package=tigris},
##   }
## 
## [[535]]
## 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},
##   }
## 
## [[536]]
## 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 4032.109,
##   <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 4032.109},
##     url = {https://CRAN.R-project.org/package=timeDate},
##   }
## 
## [[537]]
## To cite package 'tinytex' in publications use:
## 
##   Xie Y (2024). _tinytex: Helper Functions to Install and Maintain TeX
##   Live, and Compile LaTeX Documents_. R package version 0.51,
##   <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)'.
## 
## [[538]]
## To cite package 'tm' in publications use:
## 
##   Feinerer I, Hornik K (2024). _tm: Text Mining Package_. R package
##   version 0.7-13, <https://CRAN.R-project.org/package=tm>.
## 
##   Feinerer I, Hornik K, Meyer D (2008). "Text Mining Infrastructure in
##   R." _Journal of Statistical Software_, *25*(5), 1-54.
##   doi:10.18637/jss.v025.i05 <https://doi.org/10.18637/jss.v025.i05>.
## 
## To see these entries in BibTeX format, use 'print(<citation>,
## bibtex=TRUE)', 'toBibtex(.)', or set
## 'options(citation.bibtex.max=999)'.
## 
## [[539]]
## 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},
##   }
## 
## [[540]]
## 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},
##   }
## 
## [[541]]
## To cite package 'tmvnsim' in publications use:
## 
##   Bhattacjarjee S (2016). _tmvnsim: Truncated Multivariate Normal
##   Simulation_. R package version 1.0-2,
##   <https://CRAN.R-project.org/package=tmvnsim>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {tmvnsim: Truncated Multivariate Normal Simulation},
##     author = {Samsiddhi Bhattacjarjee},
##     year = {2016},
##     note = {R package version 1.0-2},
##     url = {https://CRAN.R-project.org/package=tmvnsim},
##   }
## 
## ATTENTION: This citation information has been auto-generated from the
## package DESCRIPTION file and may need manual editing, see
## 'help("citation")'.
## 
## [[542]]
## To cite the tokenizers package in publications, please cite the paper
## in the Journal of Open Source Software:
## 
##   Lincoln A. Mullen et al., "Fast, Consistent Tokenization of Natural
##   Language Text," Journal of Open Source Software 3, no. 23 (2018):
##   655, https://doi.org/10.21105/joss.00655.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Article{,
##     title = {Fast, Consistent Tokenization of Natural Language Text},
##     author = {Lincoln A. Mullen and Kenneth Benoit and Os Keyes and Dmitry Selivanov and Jeffrey Arnold},
##     journal = {Journal of Open Source Software},
##     year = {2018},
##     volume = {3},
##     issue = {23},
##     pages = {655},
##     url = {https://doi.org/10.21105/joss.00655},
##     doi = {10.21105/joss.00655},
##   }
## 
## [[543]]
## To cite package 'triangle' in publications use:
## 
##   Carnell R (2022). _triangle: Distribution Functions and Parameter
##   Estimates for the Triangle Distribution_. R package version 1.0,
##   <https://CRAN.R-project.org/package=triangle>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {triangle: Distribution Functions and Parameter Estimates for the Triangle
## Distribution},
##     author = {Rob Carnell},
##     year = {2022},
##     note = {R package version 1.0},
##     url = {https://CRAN.R-project.org/package=triangle},
##   }
## 
## [[544]]
## To cite package 'triebeard' in publications use:
## 
##   Keyes O, Schmidt D, Takano Y (2023). _triebeard: 'Radix' Trees in
##   'Rcpp'_. R package version 0.4.1,
##   <https://CRAN.R-project.org/package=triebeard>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {triebeard: 'Radix' Trees in 'Rcpp'},
##     author = {Os Keyes and Drew Schmidt and Yuuki Takano},
##     year = {2023},
##     note = {R package version 0.4.1},
##     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")'.
## 
## [[545]]
## 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")'.
## 
## [[546]]
## To cite package 'tseries' in publications use:
## 
##   Trapletti A, Hornik K (2024). _tseries: Time Series Analysis and
##   Computational Finance_. R package version 0.10-56,
##   <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 = {2024},
##     note = {R package version 0.10-56},
##     url = {https://CRAN.R-project.org/package=tseries},
##   }
## 
## [[547]]
## 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},
##   }
## 
## [[548]]
## To cite package 'tsibbledata' in publications use:
## 
##   O'Hara-Wild M, Hyndman R, Wang E, Godahewa R (2022). _tsibbledata:
##   Diverse Datasets for 'tsibble'_. R package version 0.4.1,
##   <https://CRAN.R-project.org/package=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 = {2022},
##     note = {R package version 0.4.1},
##     url = {https://CRAN.R-project.org/package=tsibbledata},
##   }
## 
## [[549]]
## To cite package 'tsne' in publications use:
## 
##   Donaldson J (2022). _tsne: T-Distributed Stochastic Neighbor
##   Embedding for R (t-SNE)_. R package version 0.1-3.1,
##   <https://CRAN.R-project.org/package=tsne>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {tsne: T-Distributed Stochastic Neighbor Embedding for R (t-SNE)},
##     author = {Justin Donaldson},
##     year = {2022},
##     note = {R package version 0.1-3.1},
##     url = {https://CRAN.R-project.org/package=tsne},
##   }
## 
## ATTENTION: This citation information has been auto-generated from the
## package DESCRIPTION file and may need manual editing, see
## 'help("citation")'.
## 
## [[550]]
## To cite package 'TSP' in publications use:
## 
##   Hahsler M, Hornik K (2023). _TSP: Traveling Salesperson Problem
##   (TSP)_. R package version 1.2-4,
##   <https://CRAN.R-project.org/package=TSP>.
## 
##   Hahsler M, Hornik K (2007). "TSP - Infrastructure for the traveling
##   salesperson problem." _Journal of Statistical Software_, *23*(2),
##   1-21. ISSN 1548-7660, doi:10.18637/jss.v023.i02
##   <https://doi.org/10.18637/jss.v023.i02>.
## 
## To see these entries in BibTeX format, use 'print(<citation>,
## bibtex=TRUE)', 'toBibtex(.)', or set
## 'options(citation.bibtex.max=999)'.
## 
## [[551]]
## To cite package 'TTR' in publications use:
## 
##   Ulrich J (2023). _TTR: Technical Trading Rules_. R package version
##   0.24.4, <https://CRAN.R-project.org/package=TTR>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {TTR: Technical Trading Rules},
##     author = {Joshua Ulrich},
##     year = {2023},
##     note = {R package version 0.24.4},
##     url = {https://CRAN.R-project.org/package=TTR},
##   }
## 
## [[552]]
## To cite package 'tune' in publications use:
## 
##   Kuhn M (2024). _tune: Tidy Tuning Tools_. R package version 1.2.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 = {2024},
##     note = {R package version 1.2.1},
##     url = {https://CRAN.R-project.org/package=tune},
##   }
## 
## [[553]]
## To cite TunePareto in publications use:
## 
##   Christoph Müssel, Ludwig Lausser, Markus Maucher, Hans A. Kestler
##   (2012). Multi-Objective Parameter Selection for Classifiers. Journal
##   of Statistical Software, 46(5), 1-27. DOI
##   https://doi.org/10.18637/jss.v046.i05.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Article{,
##     title = {Multi-Objective Parameter Selection for Classifiers},
##     author = {Christoph M\"ussel and Ludwig Lausser and Markus Maucher and Hans A. Kestler},
##     journal = {Journal of Statistical Software},
##     year = {2012},
##     volume = {46},
##     number = {5},
##     pages = {1--27},
##     doi = {10.18637/jss.v046.i05},
##   }
## 
## [[554]]
## To cite package 'tweenr' in publications use:
## 
##   Pedersen T (2024). _tweenr: Interpolate Data for Smooth Animations_.
##   R package version 2.0.3, <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 = {2024},
##     note = {R package version 2.0.3},
##     url = {https://CRAN.R-project.org/package=tweenr},
##   }
## 
## [[555]]
## To cite package 'twosamples' in publications use:
## 
##   Dowd C (2023). _twosamples: Fast Permutation Based Two Sample Tests_.
##   R package version 2.0.1,
##   <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 = {2023},
##     note = {R package version 2.0.1},
##     url = {https://CRAN.R-project.org/package=twosamples},
##   }
## 
## [[556]]
## 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},
##   }
## 
## [[557]]
## To cite package 'ucminf' in publications use:
## 
##   Nielsen H, Mortensen S (2023). _ucminf: General-Purpose Unconstrained
##   Non-Linear Optimization_. R package version 1.2.1,
##   <https://CRAN.R-project.org/package=ucminf>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {ucminf: General-Purpose Unconstrained Non-Linear Optimization},
##     author = {Hans Bruun Nielsen and Stig Bousgaard Mortensen},
##     year = {2023},
##     note = {R package version 1.2.1},
##     url = {https://CRAN.R-project.org/package=ucminf},
##   }
## 
## [[558]]
## 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},
##   }
## 
## [[559]]
## 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'))
## 
## [[560]]
## 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")'.
## 
## [[561]]
## 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")'.
## 
## [[562]]
## To cite package 'usmap' in publications use:
## 
##   Di Lorenzo P (2024). _usmap: US Maps Including Alaska and Hawaii_. R
##   package version 0.7.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 = {2024},
##     note = {R package version 0.7.1},
##     url = {https://CRAN.R-project.org/package=usmap},
##   }
## 
## [[563]]
## To cite package 'usmapdata' in publications use:
## 
##   Di Lorenzo P (2024). _usmapdata: Mapping Data for 'usmap' Package_. R
##   package version 0.3.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 = {2024},
##     note = {R package version 0.3.0},
##     url = {https://CRAN.R-project.org/package=usmapdata},
##   }
## 
## [[564]]
## 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},
##   }
## 
## [[565]]
## To cite package 'uuid' in publications use:
## 
##   Urbanek S, Ts'o T (2024). _uuid: Tools for Generating and Handling of
##   UUIDs_. R package version 1.2-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 = {2024},
##     note = {R package version 1.2-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")'.
## 
## [[566]]
## Meyer D, Zeileis A, Hornik K, Friendly M (2023). _vcd: Visualizing
## Categorical Data_. R package version 1.4-12,
## <https://CRAN.R-project.org/package=vcd>.
## 
## 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)'.
## 
## [[567]]
## To cite package 'vctrs' in publications use:
## 
##   Wickham H, Henry L, Vaughan D (2023). _vctrs: Vector Helpers_. R
##   package version 0.6.5, <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.5},
##     url = {https://CRAN.R-project.org/package=vctrs},
##   }
## 
## [[568]]
## 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 (2024). _vegan: Community Ecology
##   Package_. R package version 2.6-6.1,
##   <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 = {2024},
##     note = {R package version 2.6-6.1},
##     url = {https://CRAN.R-project.org/package=vegan},
##   }
## 
## [[569]]
## To cite viridis/viridisLite in publications use:
## 
##   Simon Garnier, Noam Ross, Robert Rudis, Antônio P. Camargo, Marco
##   Sciaini, and Cédric Scherer (2024). viridis(Lite) -
##   Colorblind-Friendly Color Maps for R. viridis package version 0.6.5.
## 
## 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 = {2024},
##     note = {viridis package version 0.6.5},
##     url = {https://sjmgarnier.github.io/viridis/},
##     doi = {10.5281/zenodo.4679423},
##   }
## 
## [[570]]
## 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},
##   }
## 
## [[571]]
## 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},
##   }
## 
## [[572]]
## 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.5,
##   <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.5},
##     url = {https://CRAN.R-project.org/package=vroom},
##   }
## 
## [[573]]
## 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},
##   }
## 
## [[574]]
## To cite package 'warp' in publications use:
## 
##   Vaughan D (2023). _warp: Group Dates_. R package version 0.2.1,
##   <https://CRAN.R-project.org/package=warp>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {warp: Group Dates},
##     author = {Davis Vaughan},
##     year = {2023},
##     note = {R package version 0.2.1},
##     url = {https://CRAN.R-project.org/package=warp},
##   }
## 
## [[575]]
## To cite package 'WDI' in publications use:
## 
##   Arel-Bundock V (2022). _WDI: World Development Indicators and Other
##   World Bank Data_. R package version 2.7.8,
##   <https://CRAN.R-project.org/package=WDI>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {WDI: World Development Indicators and Other World Bank Data},
##     author = {Vincent Arel-Bundock},
##     year = {2022},
##     note = {R package version 2.7.8},
##     url = {https://CRAN.R-project.org/package=WDI},
##   }
## 
## [[576]]
## To cite package 'webshot' in publications use:
## 
##   Chang W (2023). _webshot: Take Screenshots of Web Pages_. R package
##   version 0.5.5, <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 = {2023},
##     note = {R package version 0.5.5},
##     url = {https://CRAN.R-project.org/package=webshot},
##   }
## 
## [[577]]
## 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")'.
## 
## [[578]]
## 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},
##   }
## 
## [[579]]
## To cite package 'withr' in publications use:
## 
##   Hester J, Henry L, Müller K, Ushey K, Wickham H, Chang W (2024).
##   _withr: Run Code 'With' Temporarily Modified Global State_. R package
##   version 3.0.0, <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 = {2024},
##     note = {R package version 3.0.0},
##     url = {https://CRAN.R-project.org/package=withr},
##   }
## 
## [[580]]
## To cite package 'wk' in publications use:
## 
##   Dunnington D, Pebesma E (2023). _wk: Lightweight Well-Known Geometry
##   Parsing_. R package version 0.9.1,
##   <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.9.1},
##     url = {https://CRAN.R-project.org/package=wk},
##   }
## 
## [[581]]
## To cite package 'woe' in publications use:
## 
##   Thoppay SM (2015). _woe: Computes Weight of Evidence and Information
##   Values_. R package version 0.2,
##   <https://CRAN.R-project.org/package=woe>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {woe: Computes Weight of Evidence and Information Values},
##     author = {Sudarson Mothilal Thoppay},
##     year = {2015},
##     note = {R package version 0.2},
##     url = {https://CRAN.R-project.org/package=woe},
##   }
## 
## ATTENTION: This citation information has been auto-generated from the
## package DESCRIPTION file and may need manual editing, see
## 'help("citation")'.
## 
## [[582]]
## To cite package 'workflows' in publications use:
## 
##   Vaughan D, Couch S (2024). _workflows: Modeling Workflows_. R package
##   version 1.1.4, <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 = {2024},
##     note = {R package version 1.1.4},
##     url = {https://CRAN.R-project.org/package=workflows},
##   }
## 
## [[583]]
## To cite package 'workflowsets' in publications use:
## 
##   Kuhn M, Couch S (2024). _workflowsets: Create a Collection of
##   'tidymodels' Workflows_. R package version 1.1.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 = {2024},
##     note = {R package version 1.1.0},
##     url = {https://CRAN.R-project.org/package=workflowsets},
##   }
## 
## [[584]]
## To cite package 'xefun' in publications use:
## 
##   Xie S (2023). _xefun: X-Engineering or Supporting Functions_. R
##   package version 0.1.5, <https://CRAN.R-project.org/package=xefun>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {xefun: X-Engineering or Supporting Functions},
##     author = {Shichen Xie},
##     year = {2023},
##     note = {R package version 0.1.5},
##     url = {https://CRAN.R-project.org/package=xefun},
##   }
## 
## [[585]]
## To cite package 'xfun' in publications use:
## 
##   Xie Y (2024). _xfun: Supporting Functions for Packages Maintained by
##   'Yihui Xie'_. R package version 0.44,
##   <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 = {2024},
##     note = {R package version 0.44},
##     url = {https://CRAN.R-project.org/package=xfun},
##   }
## 
## [[586]]
## 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
##   (2024). _xgboost: Extreme Gradient Boosting_. R package version
##   1.7.7.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 = {2024},
##     note = {R package version 1.7.7.1},
##     url = {https://CRAN.R-project.org/package=xgboost},
##   }
## 
## [[587]]
## To cite package 'XML' in publications use:
## 
##   Temple Lang D (2024). _XML: Tools for Parsing and Generating XML
##   Within R and S-Plus_. R package version 3.99-0.16.1,
##   <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 = {2024},
##     note = {R package version 3.99-0.16.1},
##     url = {https://CRAN.R-project.org/package=XML},
##   }
## 
## [[588]]
## To cite package 'xml2' in publications use:
## 
##   Wickham H, Hester J, Ooms J (2023). _xml2: Parse XML_. R package
##   version 1.3.6, <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.6},
##     url = {https://CRAN.R-project.org/package=xml2},
##   }
## 
## [[589]]
## 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},
##   }
## 
## [[590]]
## To cite package 'xts' in publications use:
## 
##   Ryan JA, Ulrich JM (2024). _xts: eXtensible Time Series_. R package
##   version 0.13.2, <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 = {2024},
##     note = {R package version 0.13.2},
##     url = {https://CRAN.R-project.org/package=xts},
##   }
## 
## [[591]]
## 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")'.
## 
## [[592]]
## To cite package 'yardstick' in publications use:
## 
##   Kuhn M, Vaughan D, Hvitfeldt E (2023). _yardstick: Tidy
##   Characterizations of Model Performance_. R package version 1.2.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 = {2023},
##     note = {R package version 1.2.0},
##     url = {https://CRAN.R-project.org/package=yardstick},
##   }
## 
## [[593]]
## 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},
##   }
## 
## [[594]]
## To cite package 'zip' in publications use:
## 
##   Csárdi G (2024). _zip: Cross-Platform 'zip' Compression_. R package
##   version 2.3.1, <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},
##     year = {2024},
##     note = {R package version 2.3.1},
##     url = {https://CRAN.R-project.org/package=zip},
##   }
## 
## [[595]]
## 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},
##   }
## 
## [[596]]
## To cite R in publications use:
## 
##   R Core Team (2023). _R: A Language and Environment for Statistical
##   Computing_. R Foundation for Statistical Computing, Vienna, Austria.
##   <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 = {2023},
##     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.
## 
## [[597]]
## To cite the 'boot' package in publications use:
## 
##   Angelo Canty and Brian Ripley (2024). boot: Bootstrap R (S-Plus)
##   Functions. R package version 1.3-30.
## 
##   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)'.
## 
## [[598]]
## 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/},
##   }
## 
## [[599]]
## To cite the R package cluster in publications use:
## 
##   Maechler, M., Rousseeuw, P., Struyf, A., Hubert, M., Hornik,
##   K.(2023).  cluster: Cluster Analysis Basics and Extensions. R package
##   version 2.1.6.
## 
## 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 = {2023},
##     url = {https://CRAN.R-project.org/package=cluster},
##     note = {R package version 2.1.6 --- For new features, see the 'NEWS' and the 'Changelog' file in the package source)},
##   }
## 
## [[600]]
## To cite package 'codetools' in publications use:
## 
##   Tierney L (2024). _codetools: Code Analysis Tools for R_. R package
##   version 0.2-20, <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 = {2024},
##     note = {R package version 0.2-20},
##     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")'.
## 
## [[601]]
## The 'compiler' package is part of R.  To cite R in publications use:
## 
##   R Core Team (2023). _R: A Language and Environment for Statistical
##   Computing_. R Foundation for Statistical Computing, Vienna, Austria.
##   <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 = {2023},
##     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.
## 
## [[602]]
## The 'datasets' package is part of R.  To cite R in publications use:
## 
##   R Core Team (2023). _R: A Language and Environment for Statistical
##   Computing_. R Foundation for Statistical Computing, Vienna, Austria.
##   <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 = {2023},
##     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.
## 
## [[603]]
## To cite package 'foreign' in publications use:
## 
##   R Core Team (2023). _foreign: Read Data Stored by 'Minitab', 'S',
##   'SAS', 'SPSS', 'Stata', 'Systat', 'Weka', 'dBase', ..._. R package
##   version 0.8-86, <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 = {2023},
##     note = {R package version 0.8-86},
##     url = {https://CRAN.R-project.org/package=foreign},
##   }
## 
## [[604]]
## The 'graphics' package is part of R.  To cite R in publications use:
## 
##   R Core Team (2023). _R: A Language and Environment for Statistical
##   Computing_. R Foundation for Statistical Computing, Vienna, Austria.
##   <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 = {2023},
##     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.
## 
## [[605]]
## The 'grDevices' package is part of R.  To cite R in publications use:
## 
##   R Core Team (2023). _R: A Language and Environment for Statistical
##   Computing_. R Foundation for Statistical Computing, Vienna, Austria.
##   <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 = {2023},
##     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.
## 
## [[606]]
## The 'grid' package is part of R.  To cite R in publications use:
## 
##   R Core Team (2023). _R: A Language and Environment for Statistical
##   Computing_. R Foundation for Statistical Computing, Vienna, Austria.
##   <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 = {2023},
##     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.
## 
## [[607]]
## To cite package 'KernSmooth' in publications use:
## 
##   Wand M (2024). _KernSmooth: Functions for Kernel Smoothing Supporting
##   Wand & Jones (1995)_. R package version 2.23-24,
##   <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 = {2024},
##     note = {R package version 2.23-24},
##     url = {https://CRAN.R-project.org/package=KernSmooth},
##   }
## 
## [[608]]
## To cite package 'lattice' in publications use:
## 
##   Sarkar D (2008). _Lattice: Multivariate Data Visualization with R_.
##   Springer, New York. ISBN 978-0-387-75968-5,
##   <http://lmdvr.r-forge.r-project.org>.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Book{,
##     title = {Lattice: Multivariate Data Visualization with R},
##     author = {Deepayan Sarkar},
##     year = {2008},
##     publisher = {Springer},
##     address = {New York},
##     isbn = {978-0-387-75968-5},
##     url = {http://lmdvr.r-forge.r-project.org},
##   }
## 
## [[609]]
## 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/},
##   }
## 
## [[610]]
## To cite package 'Matrix' in publications use:
## 
##   Bates D, Maechler M, Jagan M (2023). _Matrix: Sparse and Dense Matrix
##   Classes and Methods_. R package version 1.6-4,
##   <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 = {2023},
##     note = {R package version 1.6-4},
##     url = {https://CRAN.R-project.org/package=Matrix},
##   }
## 
## [[611]]
## The 'methods' package is part of R.  To cite R in publications use:
## 
##   R Core Team (2023). _R: A Language and Environment for Statistical
##   Computing_. R Foundation for Statistical Computing, Vienna, Austria.
##   <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 = {2023},
##     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.
## 
## [[612]]
## 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)'.
## 
## [[613]]
## To cite package 'nlme' in publications use:
## 
##   Pinheiro J, Bates D, R Core Team (2023). _nlme: Linear and Nonlinear
##   Mixed Effects Models_. R package version 3.1-164,
##   <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)'.
## 
## [[614]]
## 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/},
##   }
## 
## [[615]]
## The 'parallel' package is part of R.  To cite R in publications use:
## 
##   R Core Team (2023). _R: A Language and Environment for Statistical
##   Computing_. R Foundation for Statistical Computing, Vienna, Austria.
##   <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 = {2023},
##     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.
## 
## [[616]]
## To cite package 'rpart' in publications use:
## 
##   Therneau T, Atkinson B (2023). _rpart: Recursive Partitioning and
##   Regression Trees_. R package version 4.1.21,
##   <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 = {2023},
##     note = {R package version 4.1.21},
##     url = {https://CRAN.R-project.org/package=rpart},
##   }
## 
## [[617]]
## 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/},
##   }
## 
## [[618]]
## The 'splines' package is part of R.  To cite R in publications use:
## 
##   R Core Team (2023). _R: A Language and Environment for Statistical
##   Computing_. R Foundation for Statistical Computing, Vienna, Austria.
##   <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 = {2023},
##     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.
## 
## [[619]]
## The 'stats' package is part of R.  To cite R in publications use:
## 
##   R Core Team (2023). _R: A Language and Environment for Statistical
##   Computing_. R Foundation for Statistical Computing, Vienna, Austria.
##   <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 = {2023},
##     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.
## 
## [[620]]
## The 'stats4' package is part of R.  To cite R in publications use:
## 
##   R Core Team (2023). _R: A Language and Environment for Statistical
##   Computing_. R Foundation for Statistical Computing, Vienna, Austria.
##   <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 = {2023},
##     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.
## 
## [[621]]
## To cite package 'survival' in publications use:
## 
##   Therneau T (2023). _A Package for Survival Analysis in R_. R package
##   version 3.5-7, <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)'.
## 
## [[622]]
## The 'tcltk' package is part of R.  To cite R in publications use:
## 
##   R Core Team (2023). _R: A Language and Environment for Statistical
##   Computing_. R Foundation for Statistical Computing, Vienna, Austria.
##   <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 = {2023},
##     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]]
## The 'tools' package is part of R.  To cite R in publications use:
## 
##   R Core Team (2023). _R: A Language and Environment for Statistical
##   Computing_. R Foundation for Statistical Computing, Vienna, Austria.
##   <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 = {2023},
##     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.
## 
## [[624]]
## To cite package 'translations' in publications use:
## 
##   Team RC, worldwide c (????). _translations: The R Translations
##   Package_. R package version 4.3.1.
## 
## A BibTeX entry for LaTeX users is
## 
##   @Manual{,
##     title = {translations: The R Translations Package},
##     author = {R Core Team and contributors worldwide},
##     note = {R package version 4.3.1},
##   }
## 
## ATTENTION: This citation information has been auto-generated from the
## package DESCRIPTION file and may need manual editing, see
## 'help("citation")'.
## 
## [[625]]
## The 'utils' package is part of R.  To cite R in publications use:
## 
##   R Core Team (2023). _R: A Language and Environment for Statistical
##   Computing_. R Foundation for Statistical Computing, Vienna, Austria.
##   <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 = {2023},
##     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.