1 rempsyc

library(performance)
library(see)
library(ggplot2)
model <- lm(mpg ~ wt * cyl + gear, data = mtcars)
check_model(model)

library(rempsyc)
##View(nice_assumptions(model))
nice_table(nice_assumptions(model), col.format.p = 2:4)
# Define our dependent variables
DV <- names(mtcars[-1])
# Make list of all formulas
formulas <- paste(DV, "~ mpg")
# Make list of all models
models.list <- lapply(X = formulas, FUN = lm, data = mtcars)
# Make diagnostic table
assumptions.table <- nice_assumptions(models.list)
nice_table(assumptions.table, col.format.p = 2:4)
nice_qq(data = iris,
        variable = "Sepal.Length",
        group = "Species")

nice_normality(data = iris,
               variable = "Sepal.Length",
               group = "Species",
               shapiro = TRUE,
               histogram = TRUE,
               title = "Density (Sepal Length)")