使用 tidymodels 验证模型假设
Verify model assumptions with tidymodels
在 tidymodels 宇宙之外,验证模型假设很容易。
例如线性回归(函数 lm),包 performance 创建易于理解的图形和简单的函数(check_heteroscedasticity ()) 验证线性回归模型的假设:
- 残差的正态性
- 残差的独立性
- 残差的同质性
- 变量的非共线性。
tidymodels universe 中是否有等效的包来验证模型的假设? Tidymodels 包创建 parnsnip 对象,因此像 performance 这样的旧模型评估包是无用的。
感谢您的帮助
您使用 {parsnip} 或其他 {tidymodels} 获得的拟合模型将包含您使用的任何引擎的基础拟合模型。
有时,适合的欧洲防风草对象将直接与您正在使用的函数一起使用。 {performance} 中的 check_model()
函数就是这种情况。
library(tidymodels)
library(performance)
lm_spec <- linear_reg() %>%
set_mode("regression") %>%
set_engine("lm")
lm_fit <- fit(lm_spec, mpg ~ ., data = mtcars)
lm_fit %>%
check_model()
有时您会收到错误消息,因为该函数不知道如何处理 model_fit
对象。您可以使用 extract_fit_engine()
来提取引擎产生的拟合,然后可以与 check_heteroscedasticity()
.
一起使用
lm_fit %>%
extract_fit_engine() %>%
check_heteroscedasticity()
#> OK: Error variance appears to be homoscedastic (p = 0.188).
由 reprex package (v2.0.1)
于 2021-09-06 创建
在 tidymodels 宇宙之外,验证模型假设很容易。 例如线性回归(函数 lm),包 performance 创建易于理解的图形和简单的函数(check_heteroscedasticity ()) 验证线性回归模型的假设:
- 残差的正态性
- 残差的独立性
- 残差的同质性
- 变量的非共线性。
tidymodels universe 中是否有等效的包来验证模型的假设? Tidymodels 包创建 parnsnip 对象,因此像 performance 这样的旧模型评估包是无用的。
感谢您的帮助
您使用 {parsnip} 或其他 {tidymodels} 获得的拟合模型将包含您使用的任何引擎的基础拟合模型。
有时,适合的欧洲防风草对象将直接与您正在使用的函数一起使用。 {performance} 中的 check_model()
函数就是这种情况。
library(tidymodels)
library(performance)
lm_spec <- linear_reg() %>%
set_mode("regression") %>%
set_engine("lm")
lm_fit <- fit(lm_spec, mpg ~ ., data = mtcars)
lm_fit %>%
check_model()
有时您会收到错误消息,因为该函数不知道如何处理 model_fit
对象。您可以使用 extract_fit_engine()
来提取引擎产生的拟合,然后可以与 check_heteroscedasticity()
.
lm_fit %>%
extract_fit_engine() %>%
check_heteroscedasticity()
#> OK: Error variance appears to be homoscedastic (p = 0.188).
由 reprex package (v2.0.1)
于 2021-09-06 创建