Rstudio becomes unresponsive when viewing or autocompleting nested dataframe

As per the title, whenever I try to view or autocomplete on a nested grouped_df, Rstudio becomes unresponsive. This occurs directly after populating the nested dataframe with nine Bayesian models using brms :

RawN <- RawN %>%
  mutate(model = map(data, ~brm(bf(Values ~ 0 + Group*DOB + SW + WG + (1|Box)),
                   data = .x,
               chains = 3, cores = 3,
               family = gaussian(),
             control = list(max_treedepth = 15,
             adapt_delta = .99),
             save_pars = save_pars(all = TRUE),
             sample_prior = TRUE,
                                       seed = 42,
                                       iter = 20000,
                                       warmup = 19000)))

Windows 10
Rstudio 2023.06.1 Build 524
purrr version 1.02
brms version 2.20.1

Any idea why this may occur?

Cheers,

Matt

This topic was automatically closed 21 days after the last reply. New replies are no longer allowed.

If you have a query related to it or one of the replies, start a new topic and refer back with a link.