Robust estimation with tidymodels bootstrap resampling



https://i.ytimg.com/vi/7LGR1sEUXoI/hqdefault.jpg



See how to use bootstrap resampling to estimate model parameters using #TidyTuesday data on beer production, with code available here: https://juliasilge.com/blog/beer-production/

Original source


16 responses to “Robust estimation with tidymodels bootstrap resampling”

  1. Hi Julia! Great post! I was wondering, if I did the same process, but with decision trees instead of a linear model, would that be bagging? If so, is there a way to introduce the tidy model recipe process in the model column below or should I use the the package for fitting directly? (rpart for example). Thanks!

    beer_models <- beer_boot %>%
    mutate(
    model = map(splits, ~ lm(sugar_and_syrups ~ 0 + malt_and_malt_products, data = .)),
    coef_info = map(model, tidy)
    )

Leave a Reply