Nothing
      test_that("output from text formatting matches the expected result", {
  expect_equal(fg(3, 10), "         3", ignore_attr = TRUE)
  expect_equal(fw(3, 10), "         3", ignore_attr = TRUE)
  expect_equal(fs(), "  ", ignore_attr = TRUE)
  expect_equal(fl(3, 10), "3         ", ignore_attr = TRUE)
  expect_equal(fc(3, 10), "    3     ", ignore_attr = TRUE)
  expect_equal(formatter_t(3, 10), "         3", ignore_attr = TRUE)
  expect_equal(formatter_n(3.7589, 10), "  3.7589  ", ignore_attr = TRUE)
  expect_equal(format_cil(3, 10), "  3.000   ", ignore_attr = TRUE)
  expect_equal(format_ciu(3, 10), "  3.000   ", ignore_attr = TRUE)
  expect_equal(formats_t(), "  ", ignore_attr = TRUE)
})
test_that("output from l matches the expected result", {
  expect_equal(l(deparse(substitute(mtcars$mpg))), "mpg")
  expect_equal(l(deparse(substitute(mpg))), "mpg")
  expect_equal(l(deparse(substitute(mtcars@mpg))), "mtcars@mpg")
})
test_that("output from cpout matches the expected result", {
  model <- lm(mpg ~ disp + hp + wt + drat, data = mtcars)
  k <- cpout(model)
  expect_equal(k$e, residuals(model), ignore_attr = TRUE)
  expect_equal(k$mc, model$coefficients[-1], ignore_attr = TRUE)
  expect_equal(as.data.frame(k$data), model.frame(model)[-1], ignore_attr = TRUE)
  expect_equal(k$lmc, length(model$coefficients[-1]), ignore_attr = TRUE)
  expect_equal(k$nam, names(model.frame(model)[-1]), ignore_attr = TRUE)
  expect_equal(k$indvar, names(model.frame(model)[1]), ignore_attr = TRUE)
})
test_that("output from cpdata matches the expected result", {
  model <- lm(mpg ~ disp + hp + wt + drat, data = mtcars)
  k <- cpout(model)
  actual <- cpdata(mtcars, k$mc, k$e, 2)
  expect_equal(
    actual[[1]],
    c(
      6, 6, 4, 6, 8, 6, 8, 4, 4, 6, 6, 8, 8, 8, 8, 8, 8, 4, 4, 4, 4, 8, 8,
      8, 8, 4, 4, 4, 8, 6, 8, 4
    ), ignore_attr = TRUE
  )
  expect_equal(actual[[2]], c(
    -2.9203498, -2.0330346, -2.3992081,
    0.6259587, 0.3873286, -1.3037619,
    -1.2315502, 1.2850510, 0.3095797, -1.4791933, -2.8791933, 0.9161240,
    0.6330370, -1.2929796, -0.6093035, 0.2660135, 4.4825264, 5.5492117,
    -0.4647590, 5.5258185, -2.8364793, -2.5541073, -3.7860046, -2.1732729,
    2.2677477, -0.4740448, -0.9675111, 3.2790314, -2.2139222, -0.8851877,
    2.2406110, -2.1513153
  ), ignore_attr = TRUE)
})
test_that("output from cdplot matches the expected output", {
  model <- lm(mpg ~ disp + hp + wt + drat, data = mtcars)
  k <- ols_prep_cdplot_data(model)
  expect_equal(round(k$maxx, 3), 0.398)
  expect_equal(k$ts, 0.125)
})
test_that("output from dpred matches the expected output", {
  model <- lm(mpg ~ disp + hp + wt + drat, data = mtcars)
  k <- ols_prep_dsrvf_data(model)
  expect_equal(round(k$cmaxx, 3), 3.516)
  expect_equal(round(k$cminx, 3), -2.44)
})
test_that("output from ka matches the expected result", {
  expect_equal(round(ka(10, 0.69, 30), 3), -0.326)
})
test_that("output from corrout matches the expected output", {
  model <- lm(mpg ~ disp + hp + wt + drat, data = mtcars)
  k <- corrout(model)
  expect_equal(round(k, 3), 0.960)
})
test_that("output from obspred matches the expected output", {
  model <- lm(mpg ~ disp + hp + wt + drat, data = mtcars)
  k <- obspred(model)
  expect_equal(mean(k[[1]]), mean(k[[2]]))
})
test_that("output from hadio matches the expected output", {
  model <- lm(mpg ~ disp + hp + wt + drat, data = mtcars)
  k <- hadio(model, 1)
  expect_equal(round(mean(k), 3), 0.412)
})
test_that("output from rsdata matches the expected output", {
  model <- lm(mpg ~ disp + hp + wt + drat, data = mtcars)
  k <- ols_prep_rfsplot_rsdata(model)
  expect_equal(round(mean(k$x), 3), 0.516)
  expect_equal(round(max(k$y), 3), 5.688)
})
test_that("output from fmdata matches the expected output", {
  skip_on_cran()
  model <- lm(mpg ~ disp + hp + wt + drat, data = mtcars)
  k <- ols_prep_rfsplot_fmdata(model)
  expect_equal(round(mean(k$x), 3), 0.517)
  expect_equal(round(max(k$y), 3), 10.635)
})
test_that("output from rvspdata matches the expected output", {
  model <- lm(mpg ~ disp + hp + wt + drat, data = mtcars)
  k <- rvspdata(model)
  expect_equal(round(mean(k$predicted), 3), 20.091)
  expect_equal(round(median(k$resid), 3), -0.506)
})
test_that("output from rvsrdata matches the expected output", {
  model <- lm(mpg ~ disp + hp + wt + drat, data = mtcars)
  k <- ols_prep_rvsrplot_data(model)
  expect_equal(k$np, 4)
  expect_equal(k$pnames, c("disp", "hp", "wt", "drat"), ignore_attr = TRUE)
  expect_equal(round(mean(k$dat[[1]]), 3), 230.722)
})
test_that("output from srdata matches the expected result", {
  model <- lm(mpg ~ disp + hp + wt + drat, data = mtcars)
  k <- ols_prep_srplot_data(model)
  expect_equal(k$cmaxx, 4)
  expect_equal(k$cminx, -3)
  expect_equal(k$nseq, c(-1, -2), ignore_attr = TRUE)
  expect_equal(k$pseq, c(1, 2, 3), ignore_attr = TRUE)
})
test_that("output from histdata matches the expected result", {
  model <- lm(mpg ~ disp + hp + wt + drat, data = mtcars)
  k <- histdata(model)
  expect_equal(round(k$maxx, 3), 6.688)
  expect_equal(round(k$minx, 3), -4.508)
})
test_that("output from rstudlev matches the expected result", {
  model <- lm(mpg ~ disp + hp + wt + drat, data = mtcars)
  k <- ols_prep_rstudlev_data(model)
  expect_equal(k$lev_thrsh, 0.3125)
  expect_equal(round(k$minx, 3), 0.046)
  expect_equal(round(k$miny, 3), -4.44)
  expect_equal(round(k$maxx, 3), 0.508)
  expect_equal(round(k$maxy, 3), 5.516)
})
test_that("output from corrout matches the expected result", {
  model <- lm(mpg ~ disp + hp + wt + drat, data = mtcars)
  expect_equal(round(corrout(model), 3), 0.96)
})
test_that("output from advarx matches the expected output", {
  
  actual   <- ols_prep_regress_x(mtcars, 1)
  expected <- unname(residuals(lm(mpg ~., data = mtcars)))
  
  expect_equal(actual, expected, ignore_attr = TRUE)
})
Any scripts or data that you put into this service are public.
Add the following code to your website.
For more information on customizing the embed code, read Embedding Snippets.