Skip to content

Commit 98f2f6a

Browse files
committed
styler
1 parent e637d6f commit 98f2f6a

Some content is hidden

Large Commits have some content hidden by default. Use the searchbox below for content that may be hidden.

56 files changed

+5
-219
lines changed

R/check_autocorrelation.R

-2
Original file line numberDiff line numberDiff line change
@@ -49,7 +49,6 @@ check_autocorrelation.default <- function(x, nsim = 1000, ...) {
4949
}
5050

5151

52-
5352
# methods ------------------------------
5453

5554
#' @export
@@ -81,7 +80,6 @@ print.check_autocorrelation <- function(x, ...) {
8180
}
8281

8382

84-
8583
# utilities -------------------------------
8684

8785
.durbWats <- function(.residuals) {

R/check_clusterstructure.R

-3
Original file line numberDiff line numberDiff line change
@@ -75,7 +75,6 @@ check_clusterstructure <- function(x,
7575
}
7676

7777

78-
7978
#' @export
8079
plot.check_clusterstructure <- function(x, ...) {
8180
# Can be reimplemented with ggplot in see
@@ -88,7 +87,6 @@ plot.check_clusterstructure <- function(x, ...) {
8887
}
8988

9089

91-
9290
#' @keywords internal
9391
.clusterstructure_dm <- function(x, distance = "euclidean", method = "ward.D2") {
9492
d <- stats::dist(x, method = distance)
@@ -97,7 +95,6 @@ plot.check_clusterstructure <- function(x, ...) {
9795
}
9896

9997

100-
10198
#' @keywords internal
10299
.clusterstructure_hopkins <- function(x, distance = "euclidean") {
103100
# This is based on the hopkins() function from the clustertend package

R/check_collinearity.R

-9
Original file line numberDiff line numberDiff line change
@@ -148,7 +148,6 @@ check_collinearity <- function(x, ...) {
148148
multicollinearity <- check_collinearity
149149

150150

151-
152151
# default ------------------------------
153152

154153
#' @rdname check_collinearity
@@ -159,7 +158,6 @@ check_collinearity.default <- function(x, ci = 0.95, verbose = TRUE, ...) {
159158
}
160159

161160

162-
163161
# methods -------------------------------------------
164162

165163
#' @export
@@ -227,7 +225,6 @@ plot.check_collinearity <- function(x, ...) {
227225
}
228226

229227

230-
231228
# other classes ----------------------------------
232229

233230
#' @export
@@ -303,7 +300,6 @@ check_collinearity.betaor <- check_collinearity.logitor
303300
check_collinearity.betamfx <- check_collinearity.logitor
304301

305302

306-
307303
# zi-models -------------------------------------
308304

309305
#' @rdname check_collinearity
@@ -362,7 +358,6 @@ check_collinearity.zerocount <- function(x,
362358
}
363359

364360

365-
366361
# utilities ---------------------------------
367362

368363
.check_collinearity_zi_model <- function(x, component, ci = 0.95, verbose = TRUE) {
@@ -412,7 +407,6 @@ check_collinearity.zerocount <- function(x,
412407
}
413408

414409

415-
416410
.check_collinearity <- function(x, component, ci = 0.95, verbose = TRUE) {
417411
v <- .safe(insight::get_varcov(x, component = component, verbose = FALSE))
418412

@@ -586,7 +580,6 @@ check_collinearity.zerocount <- function(x,
586580
}
587581

588582

589-
590583
.term_assignments <- function(x, component, verbose = TRUE) {
591584
tryCatch(
592585
{
@@ -622,7 +615,6 @@ check_collinearity.zerocount <- function(x,
622615
}
623616

624617

625-
626618
.find_term_assignment <- function(x, component, verbose = TRUE) {
627619
pred <- insight::find_predictors(x)[[component]]
628620

@@ -657,7 +649,6 @@ check_collinearity.zerocount <- function(x,
657649
}
658650

659651

660-
661652
.zi_term_assignment <- function(x, component = "zero_inflated", verbose = TRUE) {
662653
tryCatch(
663654
{

R/check_concurvity.R

-1
Original file line numberDiff line numberDiff line change
@@ -25,7 +25,6 @@ check_concurvity.gam <- function(x, ...) {
2525
}
2626

2727

28-
2928
# methods ---------------------------------
3029

3130
#' @export

R/check_distribution.R

-5
Original file line numberDiff line numberDiff line change
@@ -61,7 +61,6 @@ check_distribution <- function(model) {
6161
}
6262

6363

64-
6564
# default -----------------------------
6665

6766
#' @export
@@ -106,7 +105,6 @@ check_distribution.default <- function(model) {
106105
}
107106

108107

109-
110108
# methods --------------------------
111109

112110
#' @export
@@ -160,7 +158,6 @@ plot.check_distribution_numeric <- function(x, ...) {
160158
}
161159

162160

163-
164161
# other classes -------------------
165162

166163
#' @export
@@ -184,7 +181,6 @@ check_distribution.numeric <- function(model) {
184181
}
185182

186183

187-
188184
# utilities -----------------------------
189185

190186
.extract_features <- function(x, type = NULL) {
@@ -243,7 +239,6 @@ check_distribution.numeric <- function(model) {
243239
}
244240

245241

246-
247242
.is_integer <- function(x) {
248243
tryCatch(
249244
ifelse(is.infinite(x), FALSE, x %% 1 == 0),

R/check_factorstructure.R

-7
Original file line numberDiff line numberDiff line change
@@ -114,9 +114,6 @@ check_factorstructure <- function(x, n = NULL, ...) {
114114
}
115115

116116

117-
118-
119-
120117
#' @rdname check_factorstructure
121118
#' @export
122119
check_kmo <- function(x, n = NULL, ...) {
@@ -169,9 +166,6 @@ check_kmo <- function(x, n = NULL, ...) {
169166
}
170167

171168

172-
173-
174-
175169
#' @rdname check_factorstructure
176170
#' @export
177171
check_sphericity_bartlett <- function(x, n = NULL, ...) {
@@ -213,7 +207,6 @@ check_sphericity_bartlett <- function(x, n = NULL, ...) {
213207
}
214208

215209

216-
217210
# Helpers -----------------------------------------------------------------
218211

219212
#' @keywords internal

R/check_heterogeneity_bias.R

-2
Original file line numberDiff line numberDiff line change
@@ -102,8 +102,6 @@ check_heterogeneity_bias <- function(x, select = NULL, by = NULL, nested = FALSE
102102
}
103103

104104

105-
106-
107105
#' @export
108106
print.check_heterogeneity_bias <- function(x, ...) {
109107
cat("Possible heterogeneity bias due to following predictors: ")

R/check_heteroscedasticity.R

-2
Original file line numberDiff line numberDiff line change
@@ -79,7 +79,6 @@ check_heteroscedasticity.default <- function(x, ...) {
7979
}
8080

8181

82-
8382
# methods -----------------------
8483

8584
#' @export
@@ -112,7 +111,6 @@ plot.check_heteroscedasticity <- function(x, ...) {
112111
}
113112

114113

115-
116114
# utilities -----------------------
117115

118116
.sigma <- function(x) {

R/check_homogeneity.R

-3
Original file line numberDiff line numberDiff line change
@@ -36,7 +36,6 @@ check_homogeneity <- function(x, method = c("bartlett", "fligner", "levene", "au
3636
}
3737

3838

39-
4039
# default -------------------------
4140

4241
#' @export
@@ -105,7 +104,6 @@ check_homogeneity.default <- function(x, method = c("bartlett", "fligner", "leve
105104
}
106105

107106

108-
109107
# methods -----------------------
110108

111109
#' @export
@@ -130,7 +128,6 @@ plot.check_homogeneity <- function(x, ...) {
130128
}
131129

132130

133-
134131
# other classes -----------------------------
135132

136133
#' @rdname check_homogeneity

R/check_htest.R

-1
Original file line numberDiff line numberDiff line change
@@ -153,7 +153,6 @@ check_symmetry.htest <- function(x, ...) {
153153
# }
154154

155155

156-
157156
# Print -------------------------------------------------------------------
158157

159158
#' @export

R/check_itemscale.R

-1
Original file line numberDiff line numberDiff line change
@@ -137,7 +137,6 @@ check_itemscale <- function(x, factor_index = NULL) {
137137
}
138138

139139

140-
141140
# methods -------------------------------------
142141

143142
#' @export

R/check_model.R

-5
Original file line numberDiff line numberDiff line change
@@ -183,7 +183,6 @@ check_model <- function(x, ...) {
183183
}
184184

185185

186-
187186
# default ----------------------------
188187

189188
#' @rdname check_model
@@ -313,7 +312,6 @@ plot.check_model <- function(x, ...) {
313312
}
314313

315314

316-
317315
# other classes ---------------------------
318316

319317
## TODO for now, convert to freq, see https://github.com/easystats/performance/issues/354
@@ -454,7 +452,6 @@ check_model.performance_simres <- function(x,
454452
check_model.DHARMa <- check_model.performance_simres
455453

456454

457-
458455
# compile plots for checks of linear models ------------------------
459456

460457
.check_assumptions_linear <- function(model, model_info, check = "all", residual_type = "normal", verbose = TRUE, ...) {
@@ -515,7 +512,6 @@ check_model.DHARMa <- check_model.performance_simres
515512
}
516513

517514

518-
519515
# compile plots for checks of generalized linear models ------------------------
520516

521517
.check_assumptions_glm <- function(model, model_info, check = "all", residual_type = "simulated", verbose = TRUE, ...) {
@@ -576,7 +572,6 @@ check_model.DHARMa <- check_model.performance_simres
576572
}
577573

578574

579-
580575
# compile plots for checks of Bayesian models ------------------------
581576

582577
.check_assumptions_stan <- function(model, ...) {

R/check_model_diagnostics.R

-8
Original file line numberDiff line numberDiff line change
@@ -25,7 +25,6 @@
2525
}
2626

2727

28-
2928
# prepare data for QQ plot ----------------------------------
3029

3130
.model_diagnostic_qq <- function(model, model_info = NULL, verbose = TRUE) {
@@ -88,7 +87,6 @@
8887
}
8988

9089

91-
9290
# prepare data for random effects QQ plot ----------------------------------
9391

9492
.model_diagnostic_ranef_qq <- function(model, level = 0.95, model_info = NULL, verbose = TRUE) {
@@ -151,7 +149,6 @@
151149
}
152150

153151

154-
155152
# prepare data for normality of residuals plot ----------------------------------
156153

157154
.model_diagnostic_normality <- function(model, verbose = TRUE) {
@@ -171,7 +168,6 @@
171168
}
172169

173170

174-
175171
# prepare data for influential obs plot ----------------------------------
176172

177173
.model_diagnostic_outlier <- function(model, threshold = NULL) {
@@ -210,7 +206,6 @@
210206
}
211207

212208

213-
214209
# prepare data for non-constant variance plot ----------------------------------
215210

216211
.model_diagnostic_ncv <- function(model, verbose = TRUE) {
@@ -238,7 +233,6 @@
238233
}
239234

240235

241-
242236
# prepare data for homogeneity of variance plot ----------------------------------
243237

244238
.model_diagnostic_homogeneity <- function(model, verbose = TRUE) {
@@ -283,7 +277,6 @@
283277
}
284278

285279

286-
287280
# prepare data for homogeneity of variance plot ----------------------------------
288281

289282
.new_diag_overdispersion <- function(model, ...) {
@@ -359,7 +352,6 @@
359352
}
360353

361354

362-
363355
.model_diagnostic_overdispersion <- function(model, ...) {
364356
faminfo <- insight::model_info(model)
365357

R/check_multimodal.R

-1
Original file line numberDiff line numberDiff line change
@@ -91,7 +91,6 @@ check_multimodal.data.frame <- function(x, ...) {
9191
}
9292

9393

94-
9594
#' @export
9695
check_multimodal.numeric <- function(x, ...) {
9796
insight::check_if_installed("multimode")

R/check_normality.R

-3
Original file line numberDiff line numberDiff line change
@@ -50,7 +50,6 @@ check_normality <- function(x, ...) {
5050
}
5151

5252

53-
5453
# default -------------------------
5554

5655
#' @export
@@ -184,7 +183,6 @@ print.check_normality <- function(x, ...) {
184183
}
185184

186185

187-
188186
# other classes --------------------
189187

190188
# mixed models ---------------------
@@ -276,7 +274,6 @@ check_normality.afex_aov <- function(x, ...) {
276274
check_normality.BFBayesFactor <- check_normality.afex_aov
277275

278276

279-
280277
# helper ---------------------
281278

282279
.check_normality <- function(x, model, type = "residuals") {

0 commit comments

Comments
 (0)