parsnip icon indicating copy to clipboard operation
parsnip copied to clipboard

new engine docs

Open topepo opened this issue 3 years ago • 1 comments

glmer engine for linear regression in tidymodels/multilevelmod#40

auto_ml for h2o engine in #758

topepo avatar Jun 16 '22 18:06 topepo

glmer docs should note the warning:

library(tidymodels)
library(multilevelmod)

tidymodels_prefer()
theme_set(theme_bw())

data(sleepstudy, package = "lme4")

lmer_spec <- 
  linear_reg() %>% 
  set_engine("glmer")

lmer_fit <- 
  lmer_spec %>% 
  fit(Reaction ~ Days + (1|Subject), data = sleepstudy)
#> Warning in lme4::glmer(formula = Reaction ~ Days + (1 | Subject), data = data, :
#> calling glmer() with family=gaussian (identity link) as a shortcut to lmer() is
#> deprecated; please call lmer() directly

lmer_fit
#> parsnip model object
#> 
#> Linear mixed model fit by REML ['lmerMod']
#> Formula: Reaction ~ Days + (1 | Subject)
#>    Data: data
#> REML criterion at convergence: 1786.465
#> Random effects:
#>  Groups   Name        Std.Dev.
#>  Subject  (Intercept) 37.12   
#>  Residual             30.99   
#> Number of obs: 180, groups:  Subject, 18
#> Fixed Effects:
#> (Intercept)         Days  
#>      251.41        10.47

Created on 2022-06-16 by the reprex package (v2.0.1)

topepo avatar Jun 16 '22 18:06 topepo

Noting that auto_ml() with h2o is now documented.

simonpcouch avatar Apr 04 '24 14:04 simonpcouch

Ah, and so is linear_reg() with glmer. :)

simonpcouch avatar Apr 04 '24 14:04 simonpcouch

This issue has been automatically locked. If you believe you have found a related problem, please file a new issue (with a reprex: https://reprex.tidyverse.org) and link to this issue.

github-actions[bot] avatar Apr 19 '24 00:04 github-actions[bot]