data manipulation & data visualization
library(foreign) # Read Data Stored by 'Minitab', 'S', 'SAS', 'SPSS', 'Stata', 'Systat', 'Weka', 'dBase'
library(ggplot2) # It is a system for creating graphics
## Warning: package 'ggplot2' was built under R version 4.3.1
library(dplyr) # A fast, consistent tool for working with data frame like objects
##
## Attaching package: 'dplyr'
## The following objects are masked from 'package:stats':
##
## filter, lag
## The following objects are masked from 'package:base':
##
## intersect, setdiff, setequal, union
library(mapview) # Quickly and conveniently create interactive visualizations of spatial data with or without background maps
## Warning: package 'mapview' was built under R version 4.3.1
library(naniar) # Provides data structures and functions that facilitate the plotting of missing values and examination of imputations.
#library(maptools) # A collection of functions to create spatial weights matrix objects from polygon 'contiguities', for summarizing these objects, and for permitting their use in spatial data analysis
library(tmap) # For drawing thematic maps
## Breaking News: tmap 3.x is retiring. Please test v4, e.g. with
## remotes::install_github('r-tmap/tmap')
library(RColorBrewer) # It offers several color palettes
library(dlookr) # A collection of tools that support data diagnosis, exploration, and transformation
##
## Attaching package: 'dlookr'
## The following object is masked from 'package:base':
##
## transform
# predictive modeling
library(regclass) # Contains basic tools for visualizing, interpreting, and building regression models
## Loading required package: bestglm
## Loading required package: leaps
## Loading required package: VGAM
## Warning: package 'VGAM' was built under R version 4.3.1
## Loading required package: stats4
## Loading required package: splines
## Loading required package: rpart
## Loading required package: randomForest
## randomForest 4.7-1.1
## Type rfNews() to see new features/changes/bug fixes.
##
## Attaching package: 'randomForest'
## The following object is masked from 'package:dplyr':
##
## combine
## The following object is masked from 'package:ggplot2':
##
## margin
## Important regclass change from 1.3:
## All functions that had a . in the name now have an _
## all.correlations -> all_correlations, cor.demo -> cor_demo, etc.
library(mctest) # Multicollinearity diagnostics
library(lmtest) # Testing linear regression models
## Loading required package: zoo
##
## Attaching package: 'zoo'
## The following objects are masked from 'package:base':
##
## as.Date, as.Date.numeric
##
## Attaching package: 'lmtest'
## The following object is masked from 'package:VGAM':
##
## lrtest
library(spdep) # A collection of functions to create spatial weights matrix objects from polygon 'contiguities', for summarizing these objects, and for permitting their use in spatial data analysis
## Warning: package 'spdep' was built under R version 4.3.1
## Loading required package: spData
## To access larger datasets in this package, install the spDataLarge
## package with: `install.packages('spDataLarge',
## repos='https://nowosad.github.io/drat/', type='source')`
## Loading required package: sf
## Warning: package 'sf' was built under R version 4.3.1
## Linking to GEOS 3.11.0, GDAL 3.5.3, PROJ 9.1.0; sf_use_s2() is TRUE
library(sf) # A standardized way to encode spatial vector data
library(spData) # Diverse spatial datasets for demonstrating, benchmarking and teaching spatial data analysis
library(spatialreg) # A collection of all the estimation functions for spatial cross-sectional models
## Warning: package 'spatialreg' was built under R version 4.3.1
## Loading required package: Matrix
##
## Attaching package: 'spatialreg'
## The following objects are masked from 'package:spdep':
##
## get.ClusterOption, get.coresOption, get.mcOption,
## get.VerboseOption, get.ZeroPolicyOption, set.ClusterOption,
## set.coresOption, set.mcOption, set.VerboseOption,
## set.ZeroPolicyOption
library(caret) # The caret package (short for Classification And Rgression Training) contains functions to streamline the model training process for complex regression and classification problems.
## Loading required package: lattice
## Warning: package 'lattice' was built under R version 4.3.1
##
## Attaching package: 'lattice'
## The following object is masked from 'package:regclass':
##
## qq
##
## Attaching package: 'caret'
## The following object is masked from 'package:VGAM':
##
## predictors
library(e1071) # Functions for latent class analysis, short time Fourier transform, fuzzy clustering, support vector machines, shortest path computation, bagged clustering, naive Bayes classifier, generalized k-nearest neighbor.
##
## Attaching package: 'e1071'
## The following objects are masked from 'package:dlookr':
##
## kurtosis, skewness
library(SparseM) # Provides some basic R functionality for linear algebra with sparse matrices
##
## Attaching package: 'SparseM'
## The following object is masked from 'package:base':
##
## backsolve
library(Metrics) # An implementation of evaluation metrics in R that are commonly used in supervised machine learning
##
## Attaching package: 'Metrics'
## The following objects are masked from 'package:caret':
##
## precision, recall
library(randomForest) # Classification and regression based on a forest of trees using random inputs
library(jtools) # This is a collection of tools for more efficiently understanding and sharing the results of (primarily) regression analyses
library(xgboost) # The package includes efficient linear model solver and tree learning algorithms
## Warning: package 'xgboost' was built under R version 4.3.1
##
## Attaching package: 'xgboost'
## The following object is masked from 'package:dplyr':
##
## slice
library(DiagrammeR) # Build graph/network structures using functions for stepwise addition and deletion of nodes and edges
## Warning: package 'DiagrammeR' was built under R version 4.3.1
library(effects) # Graphical and tabular effect displays, e.g., of interactions, for various statistical models with linear predictors
## Loading required package: carData
## Registered S3 method overwritten by 'survey':
## method from
## summary.pps dlookr
## Use the command
## lattice::trellis.par.set(effectsTheme())
## to customize lattice options for effects plots.
## See ?effectsTheme for details.
library(shinyjs)
##
## Attaching package: 'shinyjs'
## The following object is masked from 'package:Matrix':
##
## show
## The following object is masked from 'package:lmtest':
##
## reset
## The following object is masked from 'package:VGAM':
##
## show
## The following object is masked from 'package:stats4':
##
## show
## The following objects are masked from 'package:methods':
##
## removeClass, show
library(sp)
## Warning: package 'sp' was built under R version 4.3.1
#library(geoR)
library(gstat)
library(caret)