For models that have only a single component, the tidy()
and
glance()
methods are identical. Please see the documentation for both
of those methods.
# S3 method for durbinWatsonTest tidy(x, ...) # S3 method for durbinWatsonTest glance(x, ...)
x | An object of class |
---|---|
... | Additional arguments. Not used. Needed to match generic
signature only. Cautionary note: Misspelled arguments will be
absorbed in |
tidy()
, glance()
, car::durbinWatsonTest()
Other car tidiers:
leveneTest_tidiers
A tibble::tibble()
with columns:
Alternative hypothesis (character).
Autocorrelation.
The two-sided p-value associated with the observed statistic.
Test statistic for Durbin-Watson test.
Always `Durbin-Watson Test`.
#> # A tibble: 1 x 5 #> statistic p.value autocorrelation method alternative #> <dbl> <dbl> <dbl> <chr> <chr> #> 1 1.25 0.014 0.363 Durbin-Watson Test two.sided#> # A tibble: 1 x 5 #> statistic p.value autocorrelation method alternative #> <dbl> <dbl> <dbl> <chr> <chr> #> 1 1.25 0.014 0.363 Durbin-Watson Test two.sided