diff --git a/about/surveys/priorities-2020/index.Rmd b/about/surveys/priorities-2020/index.Rmd
new file mode 100644
index 00000000..699626a1
--- /dev/null
+++ b/about/surveys/priorities-2020/index.Rmd
@@ -0,0 +1,224 @@
+---
+title: "Priorities for tidymodels"
+author: "Julia Silge"
+date: '`r Sys.Date()`'
+output:
+ html_document:
+ theme: yeti
+ toc: true
+ toc_float: true
+ code_folding: hide
+---
+
+```{r setup, include=FALSE}
+library(knitr)
+knitr::opts_chunk$set(cache = TRUE, warning = FALSE,
+ message = FALSE, echo = TRUE, dpi = 300,
+ fig.width = 8, fig.height = 5)
+library(tidyverse)
+library(silgelib)
+library(scales)
+theme_set(theme_plex())
+update_geom_defaults("col", list(fill = "#54B5BF"))
+update_stat_defaults("bin", list(fill = "#54B5BF"))
+
+## if you don't have fancy fonts like IBM Plex installed, run
+## theme_set(theme_minimal())
+```
+
+
+The tidymodels team [fielded a short survey](https://twitter.com/juliasilge/status/1254879555979849729) to gather community feedback on development priorities and possible next steps. This report summarizes the survey results.
+
+## tl;dr
+
+- Over 300 people responded to our survey, most of whom said they have used tidymodels a few times.
+- The priorities given the most weight by our respondents include model stacking and a system for model monitoring, updating, and organization (across all groups).
+- Priorities involving the inner workings of tidymodels (such as skipping recipe steps, sparse data structures, etc) were among the most likely to be given zero weight.
+
+## Exploring the data
+
+Let's start by exploring the characteristics of the survey respondents.
+
+```{r tidy_survey}
+library(tidyverse)
+library(qualtRics)
+library(glue)
+
+survey_id <- "SV_ezYI0F3V9K5Tr3D"
+
+survey_raw <- fetch_survey(survey_id, verbose = FALSE, force_request = TRUE)
+
+survey_select <- survey_raw %>%
+ select(Q5_1:Q5_12, Q1002)
+
+labels_df <- enframe(sjlabelled::get_label(survey_select)) %>%
+ transmute(qid = name,
+ priority = str_trim(value))
+
+tidy_survey <- survey_select %>%
+ pivot_longer(Q5_1:Q5_12, names_to = "qid", values_to = "dollars") %>%
+ inner_join(labels_df) %>%
+ filter(priority != "Other")
+
+survey_raw %>%
+ count(StartDate = as.Date(StartDate)) %>%
+ ggplot(aes(StartDate, n)) +
+ geom_col(alpha = 0.8) +
+ labs(x = NULL,
+ y = "Number of survey responses",
+ title = "Survey responses over time",
+ subtitle = glue("There are ", {nrow(survey_raw)}, " total responses"))
+
+survey_raw %>%
+ mutate(Q1002 = fct_relabel(Q1002, str_wrap, width = 20)) %>%
+ count(Q1002) %>%
+ ggplot(aes(x = n, y = Q1002)) +
+ geom_col(alpha = 0.8) +
+ scale_x_continuous(expand = c(0,0)) +
+ labs(x = "Number of survey responses",
+ y = NULL,
+ title = "Familiarity with tidymodels",
+ subtitle = glue("Of the respondents, ",
+ {percent(mean(str_detect(survey_raw$Q1002, "a few times")))},
+ " say they have used tidymodels a few times"))
+
+survey_raw %>%
+ filter(`Duration (in seconds)` < 5e4) %>%
+ mutate(Q1002 = fct_relabel(Q1002, str_wrap, width = 20)) %>%
+ ggplot(aes(Q1002, `Duration (in seconds)`, fill = Q1002)) +
+ geom_boxplot(show.legend = FALSE, alpha = 0.7) +
+ scale_y_log10() +
+ labs(x = NULL,
+ y = "Time to take the survey (seconds)",
+ title = "Survey length in seconds",
+ subtitle = glue(
+ "The median time to take the survey was ",
+ {round(median(survey_raw$`Duration (in seconds)`) / 60, 2)},
+ " minutes")
+ )
+
+```
+
+
+## Perspectives on priorities
+
+The main question on the survey asked:
+
+> If you had a hypothetical $100 to spend on tidymodels development, how would you allocate those resources right now?
+
+The possible priorities were presented in a randomized order to respondents, except for the "Other" option at the bottom.
+
+## Mean dollars allocated {.tabset}
+
+### Overall
+
+```{r mean_all, dependson="tidy_survey", fig.width=9, fig.height=6}
+tidy_survey %>%
+ mutate(priority = str_wrap(priority, width = 20)) %>%
+ group_by(priority) %>%
+ summarise(dollars_mean = mean(dollars)) %>%
+ mutate(priority = fct_reorder(priority, dollars_mean)) %>%
+ ggplot(aes(dollars_mean, priority)) +
+ geom_col(alpha = 0.8) +
+ scale_x_continuous(labels = dollar_format(),
+ expand = c(0,0)) +
+ labs(x = "Mean hypothetical dollars allocated",
+ y = NULL,
+ title = "What are the average dollars allocated to each priority?",
+ subtitle = "Model stacking and model monitoring had the highest mean scores")
+```
+
+### By experience
+
+```{r mean_exp, dependson="tidy_survey", fig.width=10, fig.height=9}
+library(tidytext)
+
+tidy_survey %>%
+ mutate(priority = str_wrap(priority, width = 20),
+ Q1002 = fct_relabel(Q1002, str_wrap, width = 50)) %>%
+ group_by(Q1002, priority) %>%
+ summarise(dollars_mean = mean(dollars)) %>%
+ ungroup %>%
+ mutate(priority = reorder_within(priority, dollars_mean, as.character(Q1002))) %>%
+ ggplot(aes(dollars_mean, priority, fill = Q1002)) +
+ geom_col(alpha = 0.8, show.legend = FALSE) +
+ facet_wrap(~Q1002, scales = "free_y") +
+ scale_x_continuous(labels = dollar_format(),
+ expand = c(0,0)) +
+ scale_y_reordered() +
+ labs(x = "Mean hypothetical dollars allocated",
+ y = NULL,
+ title = "What are the average dollars allocated to each priority?",
+ subtitle = "Model stacking and model monitoring had the highest mean scores for all groups")
+```
+
+## Don't spend it all in one place `r emo::ji("dollar")`
+
+How many people gave their entire $100 to one priority? Very few:
+
+```{r dependson="tidy_survey"}
+tidy_survey %>%
+ filter(dollars > 99) %>%
+ count(priority, sort = TRUE) %>%
+ kable(col.names = c("Priority", "Number of respondents allocating *all*"))
+```
+
+## Priorities least likely to be chosen {.tabset}
+
+What priorities were people more likely to allocate $0 to?
+
+### Overall
+
+```{r none_all, dependson="tidy_survey", fig.width=9, fig.height=6}
+tidy_survey %>%
+ mutate(priority = str_wrap(priority, width = 20)) %>%
+ group_by(priority) %>%
+ summarise(none = sum(dollars < 1)) %>%
+ ggplot(aes(none, fct_reorder(priority, none))) +
+ geom_col(alpha = 0.8) +
+ scale_x_continuous(expand = c(0,0)) +
+ labs(x = "Number of people who allocated nothing",
+ y = NULL,
+ title = "Which priorities were chosen least often?",
+ subtitle = "Sparse structures, ignoring recipe steps, and H2O support were chosen less often")
+```
+
+### By experience
+
+```{r none_exp, dependson="tidy_survey", fig.width=10, fig.height=9}
+tidy_survey %>%
+ mutate(priority = str_wrap(priority, width = 20),
+ Q1002 = fct_relabel(Q1002, str_wrap, width = 50)) %>%
+ group_by(Q1002, priority) %>%
+ summarise(none = sum(dollars < 1)) %>%
+ ungroup %>%
+ mutate(priority = reorder_within(priority, none, as.character(Q1002))) %>%
+ ggplot(aes(none, priority, fill = Q1002)) +
+ geom_col(alpha = 0.8, show.legend = FALSE) +
+ facet_wrap(~Q1002, scales = "free") +
+ scale_x_continuous(expand = c(0,0)) +
+ scale_y_reordered() +
+ labs(x = "Number of people who allocated nothing",
+ y = NULL,
+ title = "Which priorities were chosen least often?",
+ subtitle = "There is more variation between groups in what is never chosen than the mean allocated")
+```
+
+
+## Other answers
+
+We offered respondents the opportunity to give us their own ideas for priorities as well. What kinds of options did respondents suggest?
+
+```{r dependson="tidy_survey"}
+library(DT)
+survey_raw %>%
+ filter(!is.na(Q5_12_TEXT)) %>%
+ arrange(Q1002) %>%
+ select(Q1002, Q5_12_TEXT) %>%
+ datatable(colnames = c("Familiarity with tidymodels",
+ "Suggested priority"),
+ options = list(pageLength = 25))
+```
+
+
+Some of these suggestions cover work already planned (mixed effects models) but others focus on areas we already support (lasso, unsupervised methods). Some of that is to be expected from any survey of users like this, but their prevalence likely reflects a lack of documentation and resources showing how to use tidymodels for such tasks.
diff --git a/about/surveys/priorities-2020/index.html b/about/surveys/priorities-2020/index.html
new file mode 100644
index 00000000..1c17e112
--- /dev/null
+++ b/about/surveys/priorities-2020/index.html
@@ -0,0 +1,4382 @@
+
+
+
+
+
The tidymodels team fielded a short survey to gather community feedback on development priorities and possible next steps. This report summarizes the survey results.
+
+
tl;dr
+
+
Over 300 people responded to our survey, most of whom said they have used tidymodels a few times.
+
The priorities given the most weight by our respondents include model stacking and a system for model monitoring, updating, and organization (across all groups).
+
Priorities involving the inner workings of tidymodels (such as skipping recipe steps, sparse data structures, etc) were among the most likely to be given zero weight.
+
+
+
+
Exploring the data
+
Let’s start by exploring the characteristics of the survey respondents.
survey_raw %>%
+ mutate(Q1002 = fct_relabel(Q1002, str_wrap, width = 20)) %>%
+ count(Q1002) %>%
+ ggplot(aes(x = n, y = Q1002)) +
+ geom_col(alpha = 0.8) +
+ scale_x_continuous(expand = c(0,0)) +
+ labs(x = "Number of survey responses",
+ y = NULL,
+ title = "Familiarity with tidymodels",
+ subtitle = glue("Of the respondents, ",
+ {percent(mean(str_detect(survey_raw$Q1002, "a few times")))},
+ " say they have used tidymodels a few times"))
+
+
survey_raw %>%
+ filter(`Duration (in seconds)` < 5e4) %>%
+ mutate(Q1002 = fct_relabel(Q1002, str_wrap, width = 20)) %>%
+ ggplot(aes(Q1002, `Duration (in seconds)`, fill = Q1002)) +
+ geom_boxplot(show.legend = FALSE, alpha = 0.7) +
+ scale_y_log10() +
+ labs(x = NULL,
+ y = "Time to take the survey (seconds)",
+ title = "Survey length in seconds",
+ subtitle = glue(
+ "The median time to take the survey was ",
+ {round(median(survey_raw$`Duration (in seconds)`) / 60, 2)},
+ " minutes")
+ )
+
+
+
+
Perspectives on priorities
+
The main question on the survey asked:
+
+
If you had a hypothetical $100 to spend on tidymodels development, how would you allocate those resources right now?
+
+
The possible priorities were presented in a randomized order to respondents, except for the “Other” option at the bottom.
+
+
+
Mean dollars allocated
+
+
Overall
+
tidy_survey %>%
+ mutate(priority = str_wrap(priority, width = 20)) %>%
+ group_by(priority) %>%
+ summarise(dollars_mean = mean(dollars)) %>%
+ mutate(priority = fct_reorder(priority, dollars_mean)) %>%
+ ggplot(aes(dollars_mean, priority)) +
+ geom_col(alpha = 0.8) +
+ scale_x_continuous(labels = dollar_format(),
+ expand = c(0,0)) +
+ labs(x = "Mean hypothetical dollars allocated",
+ y = NULL,
+ title = "What are the average dollars allocated to each priority?",
+ subtitle = "Model stacking and model monitoring had the highest mean scores")
+
+
+
+
By experience
+
library(tidytext)
+
+tidy_survey %>%
+ mutate(priority = str_wrap(priority, width = 20),
+ Q1002 = fct_relabel(Q1002, str_wrap, width = 50)) %>%
+ group_by(Q1002, priority) %>%
+ summarise(dollars_mean = mean(dollars)) %>%
+ ungroup %>%
+ mutate(priority = reorder_within(priority, dollars_mean, as.character(Q1002))) %>%
+ ggplot(aes(dollars_mean, priority, fill = Q1002)) +
+ geom_col(alpha = 0.8, show.legend = FALSE) +
+ facet_wrap(~Q1002, scales = "free_y") +
+ scale_x_continuous(labels = dollar_format(),
+ expand = c(0,0)) +
+ scale_y_reordered() +
+ labs(x = "Mean hypothetical dollars allocated",
+ y = NULL,
+ title = "What are the average dollars allocated to each priority?",
+ subtitle = "Model stacking and model monitoring had the highest mean scores for all groups")
+
+
+
+
+
Don’t spend it all in one place 💵
+
How many people gave their entire $100 to one priority? Very few:
Some of these suggestions cover work already planned (mixed effects models) but others focus on areas we already support (lasso, unsupervised methods). Some of that is to be expected from any survey of users like this, but their prevalence likely reflects a lack of documentation and resources showing how to use tidymodels for such tasks.
+
+
+
+
+
+
+
+
+
+
+
+
+
+
+
+
+
+
+
+
+
+
+
+
+
diff --git a/about/surveys/priorities-2020/index_files/figure-html/mean_all-1.png b/about/surveys/priorities-2020/index_files/figure-html/mean_all-1.png
new file mode 100644
index 00000000..e6d1c5c7
Binary files /dev/null and b/about/surveys/priorities-2020/index_files/figure-html/mean_all-1.png differ
diff --git a/about/surveys/priorities-2020/index_files/figure-html/mean_exp-1.png b/about/surveys/priorities-2020/index_files/figure-html/mean_exp-1.png
new file mode 100644
index 00000000..b17f8924
Binary files /dev/null and b/about/surveys/priorities-2020/index_files/figure-html/mean_exp-1.png differ
diff --git a/about/surveys/priorities-2020/index_files/figure-html/none_all-1.png b/about/surveys/priorities-2020/index_files/figure-html/none_all-1.png
new file mode 100644
index 00000000..ef295586
Binary files /dev/null and b/about/surveys/priorities-2020/index_files/figure-html/none_all-1.png differ
diff --git a/about/surveys/priorities-2020/index_files/figure-html/none_exp-1.png b/about/surveys/priorities-2020/index_files/figure-html/none_exp-1.png
new file mode 100644
index 00000000..08e54c6e
Binary files /dev/null and b/about/surveys/priorities-2020/index_files/figure-html/none_exp-1.png differ
diff --git a/about/surveys/priorities-2020/index_files/figure-html/tidy_survey-1.png b/about/surveys/priorities-2020/index_files/figure-html/tidy_survey-1.png
new file mode 100644
index 00000000..330193c6
Binary files /dev/null and b/about/surveys/priorities-2020/index_files/figure-html/tidy_survey-1.png differ
diff --git a/about/surveys/priorities-2020/index_files/figure-html/tidy_survey-2.png b/about/surveys/priorities-2020/index_files/figure-html/tidy_survey-2.png
new file mode 100644
index 00000000..08f2181d
Binary files /dev/null and b/about/surveys/priorities-2020/index_files/figure-html/tidy_survey-2.png differ
diff --git a/about/surveys/priorities-2020/index_files/figure-html/tidy_survey-3.png b/about/surveys/priorities-2020/index_files/figure-html/tidy_survey-3.png
new file mode 100644
index 00000000..8e75d5f3
Binary files /dev/null and b/about/surveys/priorities-2020/index_files/figure-html/tidy_survey-3.png differ
diff --git a/about/surveys/priorities-2020/results.csv b/about/surveys/priorities-2020/results.csv
new file mode 100644
index 00000000..21863a0d
--- /dev/null
+++ b/about/surveys/priorities-2020/results.csv
@@ -0,0 +1,3741 @@
+ResponseId,Q1002,qname,dollars,priority,priority_other
+R_2WuOlTB7EeMsGBR,I have used tidymodels packages a few times,Q5_1,10,Survival analysis,NA
+R_2WuOlTB7EeMsGBR,I have used tidymodels packages a few times,Q5_2,0,Support for sparse data structures,NA
+R_2WuOlTB7EeMsGBR,I have used tidymodels packages a few times,Q5_3,30,Adaptive resampling and better parallelization,NA
+R_2WuOlTB7EeMsGBR,I have used tidymodels packages a few times,Q5_4,15,"Model monitoring, updating, & organization",NA
+R_2WuOlTB7EeMsGBR,I have used tidymodels packages a few times,Q5_5,0,Translate prediction equations,NA
+R_2WuOlTB7EeMsGBR,I have used tidymodels packages a few times,Q5_6,30,Model stacking ,NA
+R_2WuOlTB7EeMsGBR,I have used tidymodels packages a few times,Q5_8,15,Post-processing in workflow(),NA
+R_2WuOlTB7EeMsGBR,I have used tidymodels packages a few times,Q5_9,0,Ignore recipe steps,NA
+R_2WuOlTB7EeMsGBR,I have used tidymodels packages a few times,Q5_10,0,H2O.ai support ,NA
+R_2WuOlTB7EeMsGBR,I have used tidymodels packages a few times,Q5_12,0,Other,NA
+R_1d67jKVzxkHxkh2,I have used tidymodels packages a few times,Q5_1,20,Survival analysis,NA
+R_1d67jKVzxkHxkh2,I have used tidymodels packages a few times,Q5_2,0,Support for sparse data structures,NA
+R_1d67jKVzxkHxkh2,I have used tidymodels packages a few times,Q5_3,10,Adaptive resampling and better parallelization,NA
+R_1d67jKVzxkHxkh2,I have used tidymodels packages a few times,Q5_4,20,"Model monitoring, updating, & organization",NA
+R_1d67jKVzxkHxkh2,I have used tidymodels packages a few times,Q5_5,0,Translate prediction equations,NA
+R_1d67jKVzxkHxkh2,I have used tidymodels packages a few times,Q5_6,30,Model stacking ,NA
+R_1d67jKVzxkHxkh2,I have used tidymodels packages a few times,Q5_8,10,Post-processing in workflow(),NA
+R_1d67jKVzxkHxkh2,I have used tidymodels packages a few times,Q5_9,10,Ignore recipe steps,NA
+R_1d67jKVzxkHxkh2,I have used tidymodels packages a few times,Q5_10,0,H2O.ai support ,NA
+R_1d67jKVzxkHxkh2,I have used tidymodels packages a few times,Q5_12,0,Other,NA
+R_2S6QhyhvAYuUuCN,I have used tidymodels packages a few times,Q5_1,25,Survival analysis,NA
+R_2S6QhyhvAYuUuCN,I have used tidymodels packages a few times,Q5_2,0,Support for sparse data structures,NA
+R_2S6QhyhvAYuUuCN,I have used tidymodels packages a few times,Q5_3,30,Adaptive resampling and better parallelization,NA
+R_2S6QhyhvAYuUuCN,I have used tidymodels packages a few times,Q5_4,25,"Model monitoring, updating, & organization",NA
+R_2S6QhyhvAYuUuCN,I have used tidymodels packages a few times,Q5_5,0,Translate prediction equations,NA
+R_2S6QhyhvAYuUuCN,I have used tidymodels packages a few times,Q5_6,0,Model stacking ,NA
+R_2S6QhyhvAYuUuCN,I have used tidymodels packages a few times,Q5_8,20,Post-processing in workflow(),NA
+R_2S6QhyhvAYuUuCN,I have used tidymodels packages a few times,Q5_9,0,Ignore recipe steps,NA
+R_2S6QhyhvAYuUuCN,I have used tidymodels packages a few times,Q5_10,0,H2O.ai support ,NA
+R_2S6QhyhvAYuUuCN,I have used tidymodels packages a few times,Q5_12,0,Other,NA
+R_1LTdTZ40R8Iirbk,I have used tidymodels packages a few times,Q5_1,0,Survival analysis,NA
+R_1LTdTZ40R8Iirbk,I have used tidymodels packages a few times,Q5_2,0,Support for sparse data structures,NA
+R_1LTdTZ40R8Iirbk,I have used tidymodels packages a few times,Q5_3,25,Adaptive resampling and better parallelization,NA
+R_1LTdTZ40R8Iirbk,I have used tidymodels packages a few times,Q5_4,0,"Model monitoring, updating, & organization",NA
+R_1LTdTZ40R8Iirbk,I have used tidymodels packages a few times,Q5_5,0,Translate prediction equations,NA
+R_1LTdTZ40R8Iirbk,I have used tidymodels packages a few times,Q5_6,25,Model stacking ,NA
+R_1LTdTZ40R8Iirbk,I have used tidymodels packages a few times,Q5_8,0,Post-processing in workflow(),NA
+R_1LTdTZ40R8Iirbk,I have used tidymodels packages a few times,Q5_9,25,Ignore recipe steps,NA
+R_1LTdTZ40R8Iirbk,I have used tidymodels packages a few times,Q5_10,25,H2O.ai support ,NA
+R_1LTdTZ40R8Iirbk,I have used tidymodels packages a few times,Q5_12,0,Other,NA
+R_Ce3Pu6nd4hzseHv,I have used tidymodels packages a few times,Q5_1,100,Survival analysis,NA
+R_Ce3Pu6nd4hzseHv,I have used tidymodels packages a few times,Q5_2,0,Support for sparse data structures,NA
+R_Ce3Pu6nd4hzseHv,I have used tidymodels packages a few times,Q5_3,0,Adaptive resampling and better parallelization,NA
+R_Ce3Pu6nd4hzseHv,I have used tidymodels packages a few times,Q5_4,0,"Model monitoring, updating, & organization",NA
+R_Ce3Pu6nd4hzseHv,I have used tidymodels packages a few times,Q5_5,0,Translate prediction equations,NA
+R_Ce3Pu6nd4hzseHv,I have used tidymodels packages a few times,Q5_6,0,Model stacking ,NA
+R_Ce3Pu6nd4hzseHv,I have used tidymodels packages a few times,Q5_8,0,Post-processing in workflow(),NA
+R_Ce3Pu6nd4hzseHv,I have used tidymodels packages a few times,Q5_9,0,Ignore recipe steps,NA
+R_Ce3Pu6nd4hzseHv,I have used tidymodels packages a few times,Q5_10,0,H2O.ai support ,NA
+R_Ce3Pu6nd4hzseHv,I have used tidymodels packages a few times,Q5_12,0,Other,NA
+R_2XcicoC7EP5dB2n,I have used tidymodels packages a few times,Q5_1,60,Survival analysis,NA
+R_2XcicoC7EP5dB2n,I have used tidymodels packages a few times,Q5_2,10,Support for sparse data structures,NA
+R_2XcicoC7EP5dB2n,I have used tidymodels packages a few times,Q5_3,0,Adaptive resampling and better parallelization,NA
+R_2XcicoC7EP5dB2n,I have used tidymodels packages a few times,Q5_4,0,"Model monitoring, updating, & organization",NA
+R_2XcicoC7EP5dB2n,I have used tidymodels packages a few times,Q5_5,30,Translate prediction equations,NA
+R_2XcicoC7EP5dB2n,I have used tidymodels packages a few times,Q5_6,0,Model stacking ,NA
+R_2XcicoC7EP5dB2n,I have used tidymodels packages a few times,Q5_8,0,Post-processing in workflow(),NA
+R_2XcicoC7EP5dB2n,I have used tidymodels packages a few times,Q5_9,0,Ignore recipe steps,NA
+R_2XcicoC7EP5dB2n,I have used tidymodels packages a few times,Q5_10,0,H2O.ai support ,NA
+R_2XcicoC7EP5dB2n,I have used tidymodels packages a few times,Q5_12,0,Other,NA
+R_8eJgjJUwTZwu3lv,I have contributed to tidymodels packages or taught others how to use them,Q5_1,0,Survival analysis,NA
+R_8eJgjJUwTZwu3lv,I have contributed to tidymodels packages or taught others how to use them,Q5_2,0,Support for sparse data structures,NA
+R_8eJgjJUwTZwu3lv,I have contributed to tidymodels packages or taught others how to use them,Q5_3,15,Adaptive resampling and better parallelization,NA
+R_8eJgjJUwTZwu3lv,I have contributed to tidymodels packages or taught others how to use them,Q5_4,30,"Model monitoring, updating, & organization",NA
+R_8eJgjJUwTZwu3lv,I have contributed to tidymodels packages or taught others how to use them,Q5_5,0,Translate prediction equations,NA
+R_8eJgjJUwTZwu3lv,I have contributed to tidymodels packages or taught others how to use them,Q5_6,30,Model stacking ,NA
+R_8eJgjJUwTZwu3lv,I have contributed to tidymodels packages or taught others how to use them,Q5_8,20,Post-processing in workflow(),NA
+R_8eJgjJUwTZwu3lv,I have contributed to tidymodels packages or taught others how to use them,Q5_9,5,Ignore recipe steps,NA
+R_8eJgjJUwTZwu3lv,I have contributed to tidymodels packages or taught others how to use them,Q5_10,0,H2O.ai support ,NA
+R_8eJgjJUwTZwu3lv,I have contributed to tidymodels packages or taught others how to use them,Q5_12,0,Other,NA
+R_3EBkWmcgGEuMoA5,I have used tidymodels packages a few times,Q5_1,0,Survival analysis,NA
+R_3EBkWmcgGEuMoA5,I have used tidymodels packages a few times,Q5_2,0,Support for sparse data structures,NA
+R_3EBkWmcgGEuMoA5,I have used tidymodels packages a few times,Q5_3,0,Adaptive resampling and better parallelization,NA
+R_3EBkWmcgGEuMoA5,I have used tidymodels packages a few times,Q5_4,10,"Model monitoring, updating, & organization",NA
+R_3EBkWmcgGEuMoA5,I have used tidymodels packages a few times,Q5_5,0,Translate prediction equations,NA
+R_3EBkWmcgGEuMoA5,I have used tidymodels packages a few times,Q5_6,10,Model stacking ,NA
+R_3EBkWmcgGEuMoA5,I have used tidymodels packages a few times,Q5_8,0,Post-processing in workflow(),NA
+R_3EBkWmcgGEuMoA5,I have used tidymodels packages a few times,Q5_9,80,Ignore recipe steps,NA
+R_3EBkWmcgGEuMoA5,I have used tidymodels packages a few times,Q5_10,0,H2O.ai support ,NA
+R_3EBkWmcgGEuMoA5,I have used tidymodels packages a few times,Q5_12,0,Other,NA
+R_72kXMnsd6jfZ82J,I have never used tidymodels,Q5_1,100,Survival analysis,NA
+R_72kXMnsd6jfZ82J,I have never used tidymodels,Q5_2,0,Support for sparse data structures,NA
+R_72kXMnsd6jfZ82J,I have never used tidymodels,Q5_3,0,Adaptive resampling and better parallelization,NA
+R_72kXMnsd6jfZ82J,I have never used tidymodels,Q5_4,0,"Model monitoring, updating, & organization",NA
+R_72kXMnsd6jfZ82J,I have never used tidymodels,Q5_5,0,Translate prediction equations,NA
+R_72kXMnsd6jfZ82J,I have never used tidymodels,Q5_6,0,Model stacking ,NA
+R_72kXMnsd6jfZ82J,I have never used tidymodels,Q5_8,0,Post-processing in workflow(),NA
+R_72kXMnsd6jfZ82J,I have never used tidymodels,Q5_9,0,Ignore recipe steps,NA
+R_72kXMnsd6jfZ82J,I have never used tidymodels,Q5_10,0,H2O.ai support ,NA
+R_72kXMnsd6jfZ82J,I have never used tidymodels,Q5_12,0,Other,NA
+R_3k5lMdWeK1QdEYh,I have used tidymodels packages a few times,Q5_1,30,Survival analysis,NA
+R_3k5lMdWeK1QdEYh,I have used tidymodels packages a few times,Q5_2,10,Support for sparse data structures,NA
+R_3k5lMdWeK1QdEYh,I have used tidymodels packages a few times,Q5_3,0,Adaptive resampling and better parallelization,NA
+R_3k5lMdWeK1QdEYh,I have used tidymodels packages a few times,Q5_4,10,"Model monitoring, updating, & organization",NA
+R_3k5lMdWeK1QdEYh,I have used tidymodels packages a few times,Q5_5,30,Translate prediction equations,NA
+R_3k5lMdWeK1QdEYh,I have used tidymodels packages a few times,Q5_6,0,Model stacking ,NA
+R_3k5lMdWeK1QdEYh,I have used tidymodels packages a few times,Q5_8,20,Post-processing in workflow(),NA
+R_3k5lMdWeK1QdEYh,I have used tidymodels packages a few times,Q5_9,0,Ignore recipe steps,NA
+R_3k5lMdWeK1QdEYh,I have used tidymodels packages a few times,Q5_10,0,H2O.ai support ,NA
+R_3k5lMdWeK1QdEYh,I have used tidymodels packages a few times,Q5_12,0,Other,NA
+R_Q3ryRBybensDrdT,I have used tidymodels packages a few times,Q5_1,0,Survival analysis,NA
+R_Q3ryRBybensDrdT,I have used tidymodels packages a few times,Q5_2,0,Support for sparse data structures,NA
+R_Q3ryRBybensDrdT,I have used tidymodels packages a few times,Q5_3,10,Adaptive resampling and better parallelization,NA
+R_Q3ryRBybensDrdT,I have used tidymodels packages a few times,Q5_4,10,"Model monitoring, updating, & organization",NA
+R_Q3ryRBybensDrdT,I have used tidymodels packages a few times,Q5_5,50,Translate prediction equations,NA
+R_Q3ryRBybensDrdT,I have used tidymodels packages a few times,Q5_6,10,Model stacking ,NA
+R_Q3ryRBybensDrdT,I have used tidymodels packages a few times,Q5_8,10,Post-processing in workflow(),NA
+R_Q3ryRBybensDrdT,I have used tidymodels packages a few times,Q5_9,10,Ignore recipe steps,NA
+R_Q3ryRBybensDrdT,I have used tidymodels packages a few times,Q5_10,0,H2O.ai support ,NA
+R_Q3ryRBybensDrdT,I have used tidymodels packages a few times,Q5_12,0,Other,NA
+R_21APzI71whcGb15,I have used tidymodels packages a few times,Q5_1,50,Survival analysis,NA
+R_21APzI71whcGb15,I have used tidymodels packages a few times,Q5_2,0,Support for sparse data structures,NA
+R_21APzI71whcGb15,I have used tidymodels packages a few times,Q5_3,0,Adaptive resampling and better parallelization,NA
+R_21APzI71whcGb15,I have used tidymodels packages a few times,Q5_4,10,"Model monitoring, updating, & organization",NA
+R_21APzI71whcGb15,I have used tidymodels packages a few times,Q5_5,30,Translate prediction equations,NA
+R_21APzI71whcGb15,I have used tidymodels packages a few times,Q5_6,0,Model stacking ,NA
+R_21APzI71whcGb15,I have used tidymodels packages a few times,Q5_8,0,Post-processing in workflow(),NA
+R_21APzI71whcGb15,I have used tidymodels packages a few times,Q5_9,10,Ignore recipe steps,NA
+R_21APzI71whcGb15,I have used tidymodels packages a few times,Q5_10,0,H2O.ai support ,NA
+R_21APzI71whcGb15,I have used tidymodels packages a few times,Q5_12,0,Other,NA
+R_Z1AtyOaIoLryNsB,I have used tidymodels packages many times,Q5_1,0,Survival analysis,NA
+R_Z1AtyOaIoLryNsB,I have used tidymodels packages many times,Q5_2,0,Support for sparse data structures,NA
+R_Z1AtyOaIoLryNsB,I have used tidymodels packages many times,Q5_3,10,Adaptive resampling and better parallelization,NA
+R_Z1AtyOaIoLryNsB,I have used tidymodels packages many times,Q5_4,10,"Model monitoring, updating, & organization",NA
+R_Z1AtyOaIoLryNsB,I have used tidymodels packages many times,Q5_5,20,Translate prediction equations,NA
+R_Z1AtyOaIoLryNsB,I have used tidymodels packages many times,Q5_6,30,Model stacking ,NA
+R_Z1AtyOaIoLryNsB,I have used tidymodels packages many times,Q5_8,30,Post-processing in workflow(),NA
+R_Z1AtyOaIoLryNsB,I have used tidymodels packages many times,Q5_9,0,Ignore recipe steps,NA
+R_Z1AtyOaIoLryNsB,I have used tidymodels packages many times,Q5_10,0,H2O.ai support ,NA
+R_Z1AtyOaIoLryNsB,I have used tidymodels packages many times,Q5_12,0,Other,NA
+R_3nCq1sJp1euRfIr,I have used tidymodels packages a few times,Q5_1,20,Survival analysis,NA
+R_3nCq1sJp1euRfIr,I have used tidymodels packages a few times,Q5_2,10,Support for sparse data structures,NA
+R_3nCq1sJp1euRfIr,I have used tidymodels packages a few times,Q5_3,20,Adaptive resampling and better parallelization,NA
+R_3nCq1sJp1euRfIr,I have used tidymodels packages a few times,Q5_4,0,"Model monitoring, updating, & organization",NA
+R_3nCq1sJp1euRfIr,I have used tidymodels packages a few times,Q5_5,10,Translate prediction equations,NA
+R_3nCq1sJp1euRfIr,I have used tidymodels packages a few times,Q5_6,10,Model stacking ,NA
+R_3nCq1sJp1euRfIr,I have used tidymodels packages a few times,Q5_8,0,Post-processing in workflow(),NA
+R_3nCq1sJp1euRfIr,I have used tidymodels packages a few times,Q5_9,0,Ignore recipe steps,NA
+R_3nCq1sJp1euRfIr,I have used tidymodels packages a few times,Q5_10,0,H2O.ai support ,NA
+R_3nCq1sJp1euRfIr,I have used tidymodels packages a few times,Q5_12,30,Other,"Linear mixed effect models, generalized additive models"
+R_3EZ16p2nMnn1181,I have used tidymodels packages a few times,Q5_1,0,Survival analysis,NA
+R_3EZ16p2nMnn1181,I have used tidymodels packages a few times,Q5_2,10,Support for sparse data structures,NA
+R_3EZ16p2nMnn1181,I have used tidymodels packages a few times,Q5_3,20,Adaptive resampling and better parallelization,NA
+R_3EZ16p2nMnn1181,I have used tidymodels packages a few times,Q5_4,0,"Model monitoring, updating, & organization",NA
+R_3EZ16p2nMnn1181,I have used tidymodels packages a few times,Q5_5,10,Translate prediction equations,NA
+R_3EZ16p2nMnn1181,I have used tidymodels packages a few times,Q5_6,20,Model stacking ,NA
+R_3EZ16p2nMnn1181,I have used tidymodels packages a few times,Q5_8,0,Post-processing in workflow(),NA
+R_3EZ16p2nMnn1181,I have used tidymodels packages a few times,Q5_9,20,Ignore recipe steps,NA
+R_3EZ16p2nMnn1181,I have used tidymodels packages a few times,Q5_10,0,H2O.ai support ,NA
+R_3EZ16p2nMnn1181,I have used tidymodels packages a few times,Q5_12,20,Other,mixed models
+R_bvyaj9H2RJY4koh,I have used tidymodels packages a few times,Q5_1,0,Survival analysis,NA
+R_bvyaj9H2RJY4koh,I have used tidymodels packages a few times,Q5_2,0,Support for sparse data structures,NA
+R_bvyaj9H2RJY4koh,I have used tidymodels packages a few times,Q5_3,0,Adaptive resampling and better parallelization,NA
+R_bvyaj9H2RJY4koh,I have used tidymodels packages a few times,Q5_4,0,"Model monitoring, updating, & organization",NA
+R_bvyaj9H2RJY4koh,I have used tidymodels packages a few times,Q5_5,100,Translate prediction equations,NA
+R_bvyaj9H2RJY4koh,I have used tidymodels packages a few times,Q5_6,0,Model stacking ,NA
+R_bvyaj9H2RJY4koh,I have used tidymodels packages a few times,Q5_8,0,Post-processing in workflow(),NA
+R_bvyaj9H2RJY4koh,I have used tidymodels packages a few times,Q5_9,0,Ignore recipe steps,NA
+R_bvyaj9H2RJY4koh,I have used tidymodels packages a few times,Q5_10,0,H2O.ai support ,NA
+R_bvyaj9H2RJY4koh,I have used tidymodels packages a few times,Q5_12,0,Other,NA
+R_W9cNv0gOX62PwyJ,I have used tidymodels packages a few times,Q5_1,25,Survival analysis,NA
+R_W9cNv0gOX62PwyJ,I have used tidymodels packages a few times,Q5_2,20,Support for sparse data structures,NA
+R_W9cNv0gOX62PwyJ,I have used tidymodels packages a few times,Q5_3,20,Adaptive resampling and better parallelization,NA
+R_W9cNv0gOX62PwyJ,I have used tidymodels packages a few times,Q5_4,25,"Model monitoring, updating, & organization",NA
+R_W9cNv0gOX62PwyJ,I have used tidymodels packages a few times,Q5_5,0,Translate prediction equations,NA
+R_W9cNv0gOX62PwyJ,I have used tidymodels packages a few times,Q5_6,5,Model stacking ,NA
+R_W9cNv0gOX62PwyJ,I have used tidymodels packages a few times,Q5_8,5,Post-processing in workflow(),NA
+R_W9cNv0gOX62PwyJ,I have used tidymodels packages a few times,Q5_9,0,Ignore recipe steps,NA
+R_W9cNv0gOX62PwyJ,I have used tidymodels packages a few times,Q5_10,0,H2O.ai support ,NA
+R_W9cNv0gOX62PwyJ,I have used tidymodels packages a few times,Q5_12,0,Other,NA
+R_31Xl4P45UYDI86E,I have used tidymodels packages a few times,Q5_1,0,Survival analysis,NA
+R_31Xl4P45UYDI86E,I have used tidymodels packages a few times,Q5_2,0,Support for sparse data structures,NA
+R_31Xl4P45UYDI86E,I have used tidymodels packages a few times,Q5_3,10,Adaptive resampling and better parallelization,NA
+R_31Xl4P45UYDI86E,I have used tidymodels packages a few times,Q5_4,35,"Model monitoring, updating, & organization",NA
+R_31Xl4P45UYDI86E,I have used tidymodels packages a few times,Q5_5,15,Translate prediction equations,NA
+R_31Xl4P45UYDI86E,I have used tidymodels packages a few times,Q5_6,20,Model stacking ,NA
+R_31Xl4P45UYDI86E,I have used tidymodels packages a few times,Q5_8,15,Post-processing in workflow(),NA
+R_31Xl4P45UYDI86E,I have used tidymodels packages a few times,Q5_9,5,Ignore recipe steps,NA
+R_31Xl4P45UYDI86E,I have used tidymodels packages a few times,Q5_10,0,H2O.ai support ,NA
+R_31Xl4P45UYDI86E,I have used tidymodels packages a few times,Q5_12,0,Other,NA
+R_22IU3eJb2zaeJdy,I have never used tidymodels,Q5_1,10,Survival analysis,NA
+R_22IU3eJb2zaeJdy,I have never used tidymodels,Q5_2,0,Support for sparse data structures,NA
+R_22IU3eJb2zaeJdy,I have never used tidymodels,Q5_3,20,Adaptive resampling and better parallelization,NA
+R_22IU3eJb2zaeJdy,I have never used tidymodels,Q5_4,20,"Model monitoring, updating, & organization",NA
+R_22IU3eJb2zaeJdy,I have never used tidymodels,Q5_5,10,Translate prediction equations,NA
+R_22IU3eJb2zaeJdy,I have never used tidymodels,Q5_6,20,Model stacking ,NA
+R_22IU3eJb2zaeJdy,I have never used tidymodels,Q5_8,15,Post-processing in workflow(),NA
+R_22IU3eJb2zaeJdy,I have never used tidymodels,Q5_9,0,Ignore recipe steps,NA
+R_22IU3eJb2zaeJdy,I have never used tidymodels,Q5_10,5,H2O.ai support ,NA
+R_22IU3eJb2zaeJdy,I have never used tidymodels,Q5_12,0,Other,NA
+R_3G9ZrIt3gcbZHHD,I have used tidymodels packages a few times,Q5_1,25,Survival analysis,NA
+R_3G9ZrIt3gcbZHHD,I have used tidymodels packages a few times,Q5_2,0,Support for sparse data structures,NA
+R_3G9ZrIt3gcbZHHD,I have used tidymodels packages a few times,Q5_3,0,Adaptive resampling and better parallelization,NA
+R_3G9ZrIt3gcbZHHD,I have used tidymodels packages a few times,Q5_4,25,"Model monitoring, updating, & organization",NA
+R_3G9ZrIt3gcbZHHD,I have used tidymodels packages a few times,Q5_5,25,Translate prediction equations,NA
+R_3G9ZrIt3gcbZHHD,I have used tidymodels packages a few times,Q5_6,25,Model stacking ,NA
+R_3G9ZrIt3gcbZHHD,I have used tidymodels packages a few times,Q5_8,0,Post-processing in workflow(),NA
+R_3G9ZrIt3gcbZHHD,I have used tidymodels packages a few times,Q5_9,0,Ignore recipe steps,NA
+R_3G9ZrIt3gcbZHHD,I have used tidymodels packages a few times,Q5_10,0,H2O.ai support ,NA
+R_3G9ZrIt3gcbZHHD,I have used tidymodels packages a few times,Q5_12,0,Other,NA
+R_1K9gvTzR1sjq5Sc,I have used tidymodels packages many times,Q5_1,0,Survival analysis,NA
+R_1K9gvTzR1sjq5Sc,I have used tidymodels packages many times,Q5_2,0,Support for sparse data structures,NA
+R_1K9gvTzR1sjq5Sc,I have used tidymodels packages many times,Q5_3,0,Adaptive resampling and better parallelization,NA
+R_1K9gvTzR1sjq5Sc,I have used tidymodels packages many times,Q5_4,30,"Model monitoring, updating, & organization",NA
+R_1K9gvTzR1sjq5Sc,I have used tidymodels packages many times,Q5_5,0,Translate prediction equations,NA
+R_1K9gvTzR1sjq5Sc,I have used tidymodels packages many times,Q5_6,0,Model stacking ,NA
+R_1K9gvTzR1sjq5Sc,I have used tidymodels packages many times,Q5_8,40,Post-processing in workflow(),NA
+R_1K9gvTzR1sjq5Sc,I have used tidymodels packages many times,Q5_9,30,Ignore recipe steps,NA
+R_1K9gvTzR1sjq5Sc,I have used tidymodels packages many times,Q5_10,0,H2O.ai support ,NA
+R_1K9gvTzR1sjq5Sc,I have used tidymodels packages many times,Q5_12,0,Other,NA
+R_2V8RonTawN40Mpw,I have used tidymodels packages a few times,Q5_1,10,Survival analysis,NA
+R_2V8RonTawN40Mpw,I have used tidymodels packages a few times,Q5_2,10,Support for sparse data structures,NA
+R_2V8RonTawN40Mpw,I have used tidymodels packages a few times,Q5_3,20,Adaptive resampling and better parallelization,NA
+R_2V8RonTawN40Mpw,I have used tidymodels packages a few times,Q5_4,0,"Model monitoring, updating, & organization",NA
+R_2V8RonTawN40Mpw,I have used tidymodels packages a few times,Q5_5,10,Translate prediction equations,NA
+R_2V8RonTawN40Mpw,I have used tidymodels packages a few times,Q5_6,10,Model stacking ,NA
+R_2V8RonTawN40Mpw,I have used tidymodels packages a few times,Q5_8,10,Post-processing in workflow(),NA
+R_2V8RonTawN40Mpw,I have used tidymodels packages a few times,Q5_9,0,Ignore recipe steps,NA
+R_2V8RonTawN40Mpw,I have used tidymodels packages a few times,Q5_10,0,H2O.ai support ,NA
+R_2V8RonTawN40Mpw,I have used tidymodels packages a few times,Q5_12,30,Other,"penalized regression (ridge, lasso)"
+R_2urAO2QiJyvoL5S,I have used tidymodels packages a few times,Q5_1,0,Survival analysis,NA
+R_2urAO2QiJyvoL5S,I have used tidymodels packages a few times,Q5_2,0,Support for sparse data structures,NA
+R_2urAO2QiJyvoL5S,I have used tidymodels packages a few times,Q5_3,25,Adaptive resampling and better parallelization,NA
+R_2urAO2QiJyvoL5S,I have used tidymodels packages a few times,Q5_4,25,"Model monitoring, updating, & organization",NA
+R_2urAO2QiJyvoL5S,I have used tidymodels packages a few times,Q5_5,0,Translate prediction equations,NA
+R_2urAO2QiJyvoL5S,I have used tidymodels packages a few times,Q5_6,0,Model stacking ,NA
+R_2urAO2QiJyvoL5S,I have used tidymodels packages a few times,Q5_8,0,Post-processing in workflow(),NA
+R_2urAO2QiJyvoL5S,I have used tidymodels packages a few times,Q5_9,25,Ignore recipe steps,NA
+R_2urAO2QiJyvoL5S,I have used tidymodels packages a few times,Q5_10,0,H2O.ai support ,NA
+R_2urAO2QiJyvoL5S,I have used tidymodels packages a few times,Q5_12,25,Other,Mixed effects models
+R_bdTCC6e2Iqh6KJP,I have used tidymodels packages a few times,Q5_1,10,Survival analysis,NA
+R_bdTCC6e2Iqh6KJP,I have used tidymodels packages a few times,Q5_2,10,Support for sparse data structures,NA
+R_bdTCC6e2Iqh6KJP,I have used tidymodels packages a few times,Q5_3,0,Adaptive resampling and better parallelization,NA
+R_bdTCC6e2Iqh6KJP,I have used tidymodels packages a few times,Q5_4,15,"Model monitoring, updating, & organization",NA
+R_bdTCC6e2Iqh6KJP,I have used tidymodels packages a few times,Q5_5,20,Translate prediction equations,NA
+R_bdTCC6e2Iqh6KJP,I have used tidymodels packages a few times,Q5_6,20,Model stacking ,NA
+R_bdTCC6e2Iqh6KJP,I have used tidymodels packages a few times,Q5_8,10,Post-processing in workflow(),NA
+R_bdTCC6e2Iqh6KJP,I have used tidymodels packages a few times,Q5_9,0,Ignore recipe steps,NA
+R_bdTCC6e2Iqh6KJP,I have used tidymodels packages a few times,Q5_10,15,H2O.ai support ,NA
+R_bdTCC6e2Iqh6KJP,I have used tidymodels packages a few times,Q5_12,0,Other,NA
+R_9HnS8XDBBmTZgf7,I have used tidymodels packages a few times,Q5_1,20,Survival analysis,NA
+R_9HnS8XDBBmTZgf7,I have used tidymodels packages a few times,Q5_2,15,Support for sparse data structures,NA
+R_9HnS8XDBBmTZgf7,I have used tidymodels packages a few times,Q5_3,15,Adaptive resampling and better parallelization,NA
+R_9HnS8XDBBmTZgf7,I have used tidymodels packages a few times,Q5_4,15,"Model monitoring, updating, & organization",NA
+R_9HnS8XDBBmTZgf7,I have used tidymodels packages a few times,Q5_5,0,Translate prediction equations,NA
+R_9HnS8XDBBmTZgf7,I have used tidymodels packages a few times,Q5_6,20,Model stacking ,NA
+R_9HnS8XDBBmTZgf7,I have used tidymodels packages a few times,Q5_8,7,Post-processing in workflow(),NA
+R_9HnS8XDBBmTZgf7,I have used tidymodels packages a few times,Q5_9,8,Ignore recipe steps,NA
+R_9HnS8XDBBmTZgf7,I have used tidymodels packages a few times,Q5_10,0,H2O.ai support ,NA
+R_9HnS8XDBBmTZgf7,I have used tidymodels packages a few times,Q5_12,0,Other,NA
+R_3hisVvGk5vtxrSb,I have used tidymodels packages a few times,Q5_1,20,Survival analysis,NA
+R_3hisVvGk5vtxrSb,I have used tidymodels packages a few times,Q5_2,0,Support for sparse data structures,NA
+R_3hisVvGk5vtxrSb,I have used tidymodels packages a few times,Q5_3,80,Adaptive resampling and better parallelization,NA
+R_3hisVvGk5vtxrSb,I have used tidymodels packages a few times,Q5_4,0,"Model monitoring, updating, & organization",NA
+R_3hisVvGk5vtxrSb,I have used tidymodels packages a few times,Q5_5,0,Translate prediction equations,NA
+R_3hisVvGk5vtxrSb,I have used tidymodels packages a few times,Q5_6,0,Model stacking ,NA
+R_3hisVvGk5vtxrSb,I have used tidymodels packages a few times,Q5_8,0,Post-processing in workflow(),NA
+R_3hisVvGk5vtxrSb,I have used tidymodels packages a few times,Q5_9,0,Ignore recipe steps,NA
+R_3hisVvGk5vtxrSb,I have used tidymodels packages a few times,Q5_10,0,H2O.ai support ,NA
+R_3hisVvGk5vtxrSb,I have used tidymodels packages a few times,Q5_12,0,Other,NA
+R_WeZK2XAO11ujlId,I have used tidymodels packages a few times,Q5_1,0,Survival analysis,NA
+R_WeZK2XAO11ujlId,I have used tidymodels packages a few times,Q5_2,0,Support for sparse data structures,NA
+R_WeZK2XAO11ujlId,I have used tidymodels packages a few times,Q5_3,0,Adaptive resampling and better parallelization,NA
+R_WeZK2XAO11ujlId,I have used tidymodels packages a few times,Q5_4,25,"Model monitoring, updating, & organization",NA
+R_WeZK2XAO11ujlId,I have used tidymodels packages a few times,Q5_5,0,Translate prediction equations,NA
+R_WeZK2XAO11ujlId,I have used tidymodels packages a few times,Q5_6,25,Model stacking ,NA
+R_WeZK2XAO11ujlId,I have used tidymodels packages a few times,Q5_8,25,Post-processing in workflow(),NA
+R_WeZK2XAO11ujlId,I have used tidymodels packages a few times,Q5_9,0,Ignore recipe steps,NA
+R_WeZK2XAO11ujlId,I have used tidymodels packages a few times,Q5_10,25,H2O.ai support ,NA
+R_WeZK2XAO11ujlId,I have used tidymodels packages a few times,Q5_12,0,Other,NA
+R_273CnRwwrz1gGW7,I have used tidymodels packages many times,Q5_1,5,Survival analysis,NA
+R_273CnRwwrz1gGW7,I have used tidymodels packages many times,Q5_2,9,Support for sparse data structures,NA
+R_273CnRwwrz1gGW7,I have used tidymodels packages many times,Q5_3,40,Adaptive resampling and better parallelization,NA
+R_273CnRwwrz1gGW7,I have used tidymodels packages many times,Q5_4,5,"Model monitoring, updating, & organization",NA
+R_273CnRwwrz1gGW7,I have used tidymodels packages many times,Q5_5,10,Translate prediction equations,NA
+R_273CnRwwrz1gGW7,I have used tidymodels packages many times,Q5_6,20,Model stacking ,NA
+R_273CnRwwrz1gGW7,I have used tidymodels packages many times,Q5_8,0,Post-processing in workflow(),NA
+R_273CnRwwrz1gGW7,I have used tidymodels packages many times,Q5_9,1,Ignore recipe steps,NA
+R_273CnRwwrz1gGW7,I have used tidymodels packages many times,Q5_10,10,H2O.ai support ,NA
+R_273CnRwwrz1gGW7,I have used tidymodels packages many times,Q5_12,0,Other,NA
+R_pGJsv82QVR5J3sl,I have used tidymodels packages a few times,Q5_1,0,Survival analysis,NA
+R_pGJsv82QVR5J3sl,I have used tidymodels packages a few times,Q5_2,0,Support for sparse data structures,NA
+R_pGJsv82QVR5J3sl,I have used tidymodels packages a few times,Q5_3,0,Adaptive resampling and better parallelization,NA
+R_pGJsv82QVR5J3sl,I have used tidymodels packages a few times,Q5_4,10,"Model monitoring, updating, & organization",NA
+R_pGJsv82QVR5J3sl,I have used tidymodels packages a few times,Q5_5,20,Translate prediction equations,NA
+R_pGJsv82QVR5J3sl,I have used tidymodels packages a few times,Q5_6,10,Model stacking ,NA
+R_pGJsv82QVR5J3sl,I have used tidymodels packages a few times,Q5_8,0,Post-processing in workflow(),NA
+R_pGJsv82QVR5J3sl,I have used tidymodels packages a few times,Q5_9,20,Ignore recipe steps,NA
+R_pGJsv82QVR5J3sl,I have used tidymodels packages a few times,Q5_10,0,H2O.ai support ,NA
+R_pGJsv82QVR5J3sl,I have used tidymodels packages a few times,Q5_12,40,Other,unsupervised methods
+R_3McCxswo4Octs51,I have used tidymodels packages a few times,Q5_1,10,Survival analysis,NA
+R_3McCxswo4Octs51,I have used tidymodels packages a few times,Q5_2,0,Support for sparse data structures,NA
+R_3McCxswo4Octs51,I have used tidymodels packages a few times,Q5_3,30,Adaptive resampling and better parallelization,NA
+R_3McCxswo4Octs51,I have used tidymodels packages a few times,Q5_4,10,"Model monitoring, updating, & organization",NA
+R_3McCxswo4Octs51,I have used tidymodels packages a few times,Q5_5,5,Translate prediction equations,NA
+R_3McCxswo4Octs51,I have used tidymodels packages a few times,Q5_6,5,Model stacking ,NA
+R_3McCxswo4Octs51,I have used tidymodels packages a few times,Q5_8,10,Post-processing in workflow(),NA
+R_3McCxswo4Octs51,I have used tidymodels packages a few times,Q5_9,30,Ignore recipe steps,NA
+R_3McCxswo4Octs51,I have used tidymodels packages a few times,Q5_10,0,H2O.ai support ,NA
+R_3McCxswo4Octs51,I have used tidymodels packages a few times,Q5_12,0,Other,NA
+R_3PFUCkk62rch0mM,I have never used tidymodels,Q5_1,0,Survival analysis,NA
+R_3PFUCkk62rch0mM,I have never used tidymodels,Q5_2,0,Support for sparse data structures,NA
+R_3PFUCkk62rch0mM,I have never used tidymodels,Q5_3,0,Adaptive resampling and better parallelization,NA
+R_3PFUCkk62rch0mM,I have never used tidymodels,Q5_4,0,"Model monitoring, updating, & organization",NA
+R_3PFUCkk62rch0mM,I have never used tidymodels,Q5_5,25,Translate prediction equations,NA
+R_3PFUCkk62rch0mM,I have never used tidymodels,Q5_6,25,Model stacking ,NA
+R_3PFUCkk62rch0mM,I have never used tidymodels,Q5_8,0,Post-processing in workflow(),NA
+R_3PFUCkk62rch0mM,I have never used tidymodels,Q5_9,25,Ignore recipe steps,NA
+R_3PFUCkk62rch0mM,I have never used tidymodels,Q5_10,25,H2O.ai support ,NA
+R_3PFUCkk62rch0mM,I have never used tidymodels,Q5_12,0,Other,NA
+R_1LqFBL0QEOwBYBR,I have never used tidymodels,Q5_1,0,Survival analysis,NA
+R_1LqFBL0QEOwBYBR,I have never used tidymodels,Q5_2,0,Support for sparse data structures,NA
+R_1LqFBL0QEOwBYBR,I have never used tidymodels,Q5_3,0,Adaptive resampling and better parallelization,NA
+R_1LqFBL0QEOwBYBR,I have never used tidymodels,Q5_4,0,"Model monitoring, updating, & organization",NA
+R_1LqFBL0QEOwBYBR,I have never used tidymodels,Q5_5,0,Translate prediction equations,NA
+R_1LqFBL0QEOwBYBR,I have never used tidymodels,Q5_6,0,Model stacking ,NA
+R_1LqFBL0QEOwBYBR,I have never used tidymodels,Q5_8,0,Post-processing in workflow(),NA
+R_1LqFBL0QEOwBYBR,I have never used tidymodels,Q5_9,0,Ignore recipe steps,NA
+R_1LqFBL0QEOwBYBR,I have never used tidymodels,Q5_10,0,H2O.ai support ,NA
+R_1LqFBL0QEOwBYBR,I have never used tidymodels,Q5_12,100,Other,Better handling of design matrices
+R_3oLQXG0DuobUzeK,I have never used tidymodels,Q5_1,10,Survival analysis,NA
+R_3oLQXG0DuobUzeK,I have never used tidymodels,Q5_2,0,Support for sparse data structures,NA
+R_3oLQXG0DuobUzeK,I have never used tidymodels,Q5_3,20,Adaptive resampling and better parallelization,NA
+R_3oLQXG0DuobUzeK,I have never used tidymodels,Q5_4,20,"Model monitoring, updating, & organization",NA
+R_3oLQXG0DuobUzeK,I have never used tidymodels,Q5_5,0,Translate prediction equations,NA
+R_3oLQXG0DuobUzeK,I have never used tidymodels,Q5_6,10,Model stacking ,NA
+R_3oLQXG0DuobUzeK,I have never used tidymodels,Q5_8,20,Post-processing in workflow(),NA
+R_3oLQXG0DuobUzeK,I have never used tidymodels,Q5_9,10,Ignore recipe steps,NA
+R_3oLQXG0DuobUzeK,I have never used tidymodels,Q5_10,10,H2O.ai support ,NA
+R_3oLQXG0DuobUzeK,I have never used tidymodels,Q5_12,0,Other,NA
+R_12yVSPnjGZv3kjS,I have used tidymodels packages a few times,Q5_1,20,Survival analysis,NA
+R_12yVSPnjGZv3kjS,I have used tidymodels packages a few times,Q5_2,10,Support for sparse data structures,NA
+R_12yVSPnjGZv3kjS,I have used tidymodels packages a few times,Q5_3,0,Adaptive resampling and better parallelization,NA
+R_12yVSPnjGZv3kjS,I have used tidymodels packages a few times,Q5_4,30,"Model monitoring, updating, & organization",NA
+R_12yVSPnjGZv3kjS,I have used tidymodels packages a few times,Q5_5,10,Translate prediction equations,NA
+R_12yVSPnjGZv3kjS,I have used tidymodels packages a few times,Q5_6,0,Model stacking ,NA
+R_12yVSPnjGZv3kjS,I have used tidymodels packages a few times,Q5_8,0,Post-processing in workflow(),NA
+R_12yVSPnjGZv3kjS,I have used tidymodels packages a few times,Q5_9,0,Ignore recipe steps,NA
+R_12yVSPnjGZv3kjS,I have used tidymodels packages a few times,Q5_10,30,H2O.ai support ,NA
+R_12yVSPnjGZv3kjS,I have used tidymodels packages a few times,Q5_12,0,Other,NA
+R_1IcwYQIob5YV7Dd,I have used tidymodels packages a few times,Q5_1,80,Survival analysis,NA
+R_1IcwYQIob5YV7Dd,I have used tidymodels packages a few times,Q5_2,0,Support for sparse data structures,NA
+R_1IcwYQIob5YV7Dd,I have used tidymodels packages a few times,Q5_3,0,Adaptive resampling and better parallelization,NA
+R_1IcwYQIob5YV7Dd,I have used tidymodels packages a few times,Q5_4,0,"Model monitoring, updating, & organization",NA
+R_1IcwYQIob5YV7Dd,I have used tidymodels packages a few times,Q5_5,0,Translate prediction equations,NA
+R_1IcwYQIob5YV7Dd,I have used tidymodels packages a few times,Q5_6,20,Model stacking ,NA
+R_1IcwYQIob5YV7Dd,I have used tidymodels packages a few times,Q5_8,0,Post-processing in workflow(),NA
+R_1IcwYQIob5YV7Dd,I have used tidymodels packages a few times,Q5_9,0,Ignore recipe steps,NA
+R_1IcwYQIob5YV7Dd,I have used tidymodels packages a few times,Q5_10,0,H2O.ai support ,NA
+R_1IcwYQIob5YV7Dd,I have used tidymodels packages a few times,Q5_12,0,Other,NA
+R_1fcQdWq4eMW0IkQ,I have used tidymodels packages many times,Q5_1,15,Survival analysis,NA
+R_1fcQdWq4eMW0IkQ,I have used tidymodels packages many times,Q5_2,0,Support for sparse data structures,NA
+R_1fcQdWq4eMW0IkQ,I have used tidymodels packages many times,Q5_3,30,Adaptive resampling and better parallelization,NA
+R_1fcQdWq4eMW0IkQ,I have used tidymodels packages many times,Q5_4,15,"Model monitoring, updating, & organization",NA
+R_1fcQdWq4eMW0IkQ,I have used tidymodels packages many times,Q5_5,0,Translate prediction equations,NA
+R_1fcQdWq4eMW0IkQ,I have used tidymodels packages many times,Q5_6,15,Model stacking ,NA
+R_1fcQdWq4eMW0IkQ,I have used tidymodels packages many times,Q5_8,0,Post-processing in workflow(),NA
+R_1fcQdWq4eMW0IkQ,I have used tidymodels packages many times,Q5_9,0,Ignore recipe steps,NA
+R_1fcQdWq4eMW0IkQ,I have used tidymodels packages many times,Q5_10,0,H2O.ai support ,NA
+R_1fcQdWq4eMW0IkQ,I have used tidymodels packages many times,Q5_12,25,Other,Support for Time Series
+R_3JowMv8v1Kqjahz,I have used tidymodels packages a few times,Q5_1,0,Survival analysis,NA
+R_3JowMv8v1Kqjahz,I have used tidymodels packages a few times,Q5_2,50,Support for sparse data structures,NA
+R_3JowMv8v1Kqjahz,I have used tidymodels packages a few times,Q5_3,0,Adaptive resampling and better parallelization,NA
+R_3JowMv8v1Kqjahz,I have used tidymodels packages a few times,Q5_4,50,"Model monitoring, updating, & organization",NA
+R_3JowMv8v1Kqjahz,I have used tidymodels packages a few times,Q5_5,0,Translate prediction equations,NA
+R_3JowMv8v1Kqjahz,I have used tidymodels packages a few times,Q5_6,0,Model stacking ,NA
+R_3JowMv8v1Kqjahz,I have used tidymodels packages a few times,Q5_8,0,Post-processing in workflow(),NA
+R_3JowMv8v1Kqjahz,I have used tidymodels packages a few times,Q5_9,0,Ignore recipe steps,NA
+R_3JowMv8v1Kqjahz,I have used tidymodels packages a few times,Q5_10,0,H2O.ai support ,NA
+R_3JowMv8v1Kqjahz,I have used tidymodels packages a few times,Q5_12,0,Other,NA
+R_2EAYLO1z0r0sdVD,I have used tidymodels packages a few times,Q5_1,15,Survival analysis,NA
+R_2EAYLO1z0r0sdVD,I have used tidymodels packages a few times,Q5_2,0,Support for sparse data structures,NA
+R_2EAYLO1z0r0sdVD,I have used tidymodels packages a few times,Q5_3,0,Adaptive resampling and better parallelization,NA
+R_2EAYLO1z0r0sdVD,I have used tidymodels packages a few times,Q5_4,15,"Model monitoring, updating, & organization",NA
+R_2EAYLO1z0r0sdVD,I have used tidymodels packages a few times,Q5_5,20,Translate prediction equations,NA
+R_2EAYLO1z0r0sdVD,I have used tidymodels packages a few times,Q5_6,35,Model stacking ,NA
+R_2EAYLO1z0r0sdVD,I have used tidymodels packages a few times,Q5_8,10,Post-processing in workflow(),NA
+R_2EAYLO1z0r0sdVD,I have used tidymodels packages a few times,Q5_9,5,Ignore recipe steps,NA
+R_2EAYLO1z0r0sdVD,I have used tidymodels packages a few times,Q5_10,0,H2O.ai support ,NA
+R_2EAYLO1z0r0sdVD,I have used tidymodels packages a few times,Q5_12,0,Other,NA
+R_2rpGbjwmuUvp3P0,I have used tidymodels packages many times,Q5_1,0,Survival analysis,NA
+R_2rpGbjwmuUvp3P0,I have used tidymodels packages many times,Q5_2,10,Support for sparse data structures,NA
+R_2rpGbjwmuUvp3P0,I have used tidymodels packages many times,Q5_3,40,Adaptive resampling and better parallelization,NA
+R_2rpGbjwmuUvp3P0,I have used tidymodels packages many times,Q5_4,10,"Model monitoring, updating, & organization",NA
+R_2rpGbjwmuUvp3P0,I have used tidymodels packages many times,Q5_5,30,Translate prediction equations,NA
+R_2rpGbjwmuUvp3P0,I have used tidymodels packages many times,Q5_6,10,Model stacking ,NA
+R_2rpGbjwmuUvp3P0,I have used tidymodels packages many times,Q5_8,0,Post-processing in workflow(),NA
+R_2rpGbjwmuUvp3P0,I have used tidymodels packages many times,Q5_9,0,Ignore recipe steps,NA
+R_2rpGbjwmuUvp3P0,I have used tidymodels packages many times,Q5_10,0,H2O.ai support ,NA
+R_2rpGbjwmuUvp3P0,I have used tidymodels packages many times,Q5_12,0,Other,NA
+R_3nGVzAVYfBe1GbT,I have used tidymodels packages many times,Q5_1,0,Survival analysis,NA
+R_3nGVzAVYfBe1GbT,I have used tidymodels packages many times,Q5_2,0,Support for sparse data structures,NA
+R_3nGVzAVYfBe1GbT,I have used tidymodels packages many times,Q5_3,0,Adaptive resampling and better parallelization,NA
+R_3nGVzAVYfBe1GbT,I have used tidymodels packages many times,Q5_4,20,"Model monitoring, updating, & organization",NA
+R_3nGVzAVYfBe1GbT,I have used tidymodels packages many times,Q5_5,0,Translate prediction equations,NA
+R_3nGVzAVYfBe1GbT,I have used tidymodels packages many times,Q5_6,20,Model stacking ,NA
+R_3nGVzAVYfBe1GbT,I have used tidymodels packages many times,Q5_8,50,Post-processing in workflow(),NA
+R_3nGVzAVYfBe1GbT,I have used tidymodels packages many times,Q5_9,10,Ignore recipe steps,NA
+R_3nGVzAVYfBe1GbT,I have used tidymodels packages many times,Q5_10,0,H2O.ai support ,NA
+R_3nGVzAVYfBe1GbT,I have used tidymodels packages many times,Q5_12,0,Other,NA
+R_WcJl2RRyDlQ61y1,I have used tidymodels packages a few times,Q5_1,20,Survival analysis,NA
+R_WcJl2RRyDlQ61y1,I have used tidymodels packages a few times,Q5_2,0,Support for sparse data structures,NA
+R_WcJl2RRyDlQ61y1,I have used tidymodels packages a few times,Q5_3,0,Adaptive resampling and better parallelization,NA
+R_WcJl2RRyDlQ61y1,I have used tidymodels packages a few times,Q5_4,10,"Model monitoring, updating, & organization",NA
+R_WcJl2RRyDlQ61y1,I have used tidymodels packages a few times,Q5_5,0,Translate prediction equations,NA
+R_WcJl2RRyDlQ61y1,I have used tidymodels packages a few times,Q5_6,0,Model stacking ,NA
+R_WcJl2RRyDlQ61y1,I have used tidymodels packages a few times,Q5_8,20,Post-processing in workflow(),NA
+R_WcJl2RRyDlQ61y1,I have used tidymodels packages a few times,Q5_9,10,Ignore recipe steps,NA
+R_WcJl2RRyDlQ61y1,I have used tidymodels packages a few times,Q5_10,40,H2O.ai support ,NA
+R_WcJl2RRyDlQ61y1,I have used tidymodels packages a few times,Q5_12,0,Other,NA
+R_33jApNru5xgTkAq,I have used tidymodels packages many times,Q5_1,0,Survival analysis,NA
+R_33jApNru5xgTkAq,I have used tidymodels packages many times,Q5_2,0,Support for sparse data structures,NA
+R_33jApNru5xgTkAq,I have used tidymodels packages many times,Q5_3,0,Adaptive resampling and better parallelization,NA
+R_33jApNru5xgTkAq,I have used tidymodels packages many times,Q5_4,20,"Model monitoring, updating, & organization",NA
+R_33jApNru5xgTkAq,I have used tidymodels packages many times,Q5_5,20,Translate prediction equations,NA
+R_33jApNru5xgTkAq,I have used tidymodels packages many times,Q5_6,20,Model stacking ,NA
+R_33jApNru5xgTkAq,I have used tidymodels packages many times,Q5_8,20,Post-processing in workflow(),NA
+R_33jApNru5xgTkAq,I have used tidymodels packages many times,Q5_9,0,Ignore recipe steps,NA
+R_33jApNru5xgTkAq,I have used tidymodels packages many times,Q5_10,0,H2O.ai support ,NA
+R_33jApNru5xgTkAq,I have used tidymodels packages many times,Q5_12,20,Other,Weights (importance sampling)
+R_yEfLcszErPZUymB,I have used tidymodels packages a few times,Q5_1,0,Survival analysis,NA
+R_yEfLcszErPZUymB,I have used tidymodels packages a few times,Q5_2,0,Support for sparse data structures,NA
+R_yEfLcszErPZUymB,I have used tidymodels packages a few times,Q5_3,25,Adaptive resampling and better parallelization,NA
+R_yEfLcszErPZUymB,I have used tidymodels packages a few times,Q5_4,0,"Model monitoring, updating, & organization",NA
+R_yEfLcszErPZUymB,I have used tidymodels packages a few times,Q5_5,0,Translate prediction equations,NA
+R_yEfLcszErPZUymB,I have used tidymodels packages a few times,Q5_6,25,Model stacking ,NA
+R_yEfLcszErPZUymB,I have used tidymodels packages a few times,Q5_8,0,Post-processing in workflow(),NA
+R_yEfLcszErPZUymB,I have used tidymodels packages a few times,Q5_9,0,Ignore recipe steps,NA
+R_yEfLcszErPZUymB,I have used tidymodels packages a few times,Q5_10,50,H2O.ai support ,NA
+R_yEfLcszErPZUymB,I have used tidymodels packages a few times,Q5_12,0,Other,NA
+R_YSPyk2FD65EDpTj,I have used tidymodels packages many times,Q5_1,20,Survival analysis,NA
+R_YSPyk2FD65EDpTj,I have used tidymodels packages many times,Q5_2,0,Support for sparse data structures,NA
+R_YSPyk2FD65EDpTj,I have used tidymodels packages many times,Q5_3,20,Adaptive resampling and better parallelization,NA
+R_YSPyk2FD65EDpTj,I have used tidymodels packages many times,Q5_4,0,"Model monitoring, updating, & organization",NA
+R_YSPyk2FD65EDpTj,I have used tidymodels packages many times,Q5_5,0,Translate prediction equations,NA
+R_YSPyk2FD65EDpTj,I have used tidymodels packages many times,Q5_6,0,Model stacking ,NA
+R_YSPyk2FD65EDpTj,I have used tidymodels packages many times,Q5_8,30,Post-processing in workflow(),NA
+R_YSPyk2FD65EDpTj,I have used tidymodels packages many times,Q5_9,30,Ignore recipe steps,NA
+R_YSPyk2FD65EDpTj,I have used tidymodels packages many times,Q5_10,0,H2O.ai support ,NA
+R_YSPyk2FD65EDpTj,I have used tidymodels packages many times,Q5_12,0,Other,NA
+R_2YWdvyxcrjhmkg5,I have used tidymodels packages a few times,Q5_1,0,Survival analysis,NA
+R_2YWdvyxcrjhmkg5,I have used tidymodels packages a few times,Q5_2,0,Support for sparse data structures,NA
+R_2YWdvyxcrjhmkg5,I have used tidymodels packages a few times,Q5_3,15,Adaptive resampling and better parallelization,NA
+R_2YWdvyxcrjhmkg5,I have used tidymodels packages a few times,Q5_4,20,"Model monitoring, updating, & organization",NA
+R_2YWdvyxcrjhmkg5,I have used tidymodels packages a few times,Q5_5,0,Translate prediction equations,NA
+R_2YWdvyxcrjhmkg5,I have used tidymodels packages a few times,Q5_6,40,Model stacking ,NA
+R_2YWdvyxcrjhmkg5,I have used tidymodels packages a few times,Q5_8,25,Post-processing in workflow(),NA
+R_2YWdvyxcrjhmkg5,I have used tidymodels packages a few times,Q5_9,0,Ignore recipe steps,NA
+R_2YWdvyxcrjhmkg5,I have used tidymodels packages a few times,Q5_10,0,H2O.ai support ,NA
+R_2YWdvyxcrjhmkg5,I have used tidymodels packages a few times,Q5_12,0,Other,NA
+R_5hYguKqZi0DrfDH,I have used tidymodels packages many times,Q5_1,10,Survival analysis,NA
+R_5hYguKqZi0DrfDH,I have used tidymodels packages many times,Q5_2,0,Support for sparse data structures,NA
+R_5hYguKqZi0DrfDH,I have used tidymodels packages many times,Q5_3,0,Adaptive resampling and better parallelization,NA
+R_5hYguKqZi0DrfDH,I have used tidymodels packages many times,Q5_4,20,"Model monitoring, updating, & organization",NA
+R_5hYguKqZi0DrfDH,I have used tidymodels packages many times,Q5_5,20,Translate prediction equations,NA
+R_5hYguKqZi0DrfDH,I have used tidymodels packages many times,Q5_6,50,Model stacking ,NA
+R_5hYguKqZi0DrfDH,I have used tidymodels packages many times,Q5_8,0,Post-processing in workflow(),NA
+R_5hYguKqZi0DrfDH,I have used tidymodels packages many times,Q5_9,0,Ignore recipe steps,NA
+R_5hYguKqZi0DrfDH,I have used tidymodels packages many times,Q5_10,0,H2O.ai support ,NA
+R_5hYguKqZi0DrfDH,I have used tidymodels packages many times,Q5_12,0,Other,NA
+R_plUgVza8awZ1Uu5,I have used tidymodels packages a few times,Q5_1,10,Survival analysis,NA
+R_plUgVza8awZ1Uu5,I have used tidymodels packages a few times,Q5_2,0,Support for sparse data structures,NA
+R_plUgVza8awZ1Uu5,I have used tidymodels packages a few times,Q5_3,0,Adaptive resampling and better parallelization,NA
+R_plUgVza8awZ1Uu5,I have used tidymodels packages a few times,Q5_4,20,"Model monitoring, updating, & organization",NA
+R_plUgVza8awZ1Uu5,I have used tidymodels packages a few times,Q5_5,20,Translate prediction equations,NA
+R_plUgVza8awZ1Uu5,I have used tidymodels packages a few times,Q5_6,20,Model stacking ,NA
+R_plUgVza8awZ1Uu5,I have used tidymodels packages a few times,Q5_8,0,Post-processing in workflow(),NA
+R_plUgVza8awZ1Uu5,I have used tidymodels packages a few times,Q5_9,10,Ignore recipe steps,NA
+R_plUgVza8awZ1Uu5,I have used tidymodels packages a few times,Q5_10,20,H2O.ai support ,NA
+R_plUgVza8awZ1Uu5,I have used tidymodels packages a few times,Q5_12,0,Other,NA
+R_3iKlvN1NAtJ1etU,I have contributed to tidymodels packages or taught others how to use them,Q5_1,10,Survival analysis,NA
+R_3iKlvN1NAtJ1etU,I have contributed to tidymodels packages or taught others how to use them,Q5_2,0,Support for sparse data structures,NA
+R_3iKlvN1NAtJ1etU,I have contributed to tidymodels packages or taught others how to use them,Q5_3,20,Adaptive resampling and better parallelization,NA
+R_3iKlvN1NAtJ1etU,I have contributed to tidymodels packages or taught others how to use them,Q5_4,10,"Model monitoring, updating, & organization",NA
+R_3iKlvN1NAtJ1etU,I have contributed to tidymodels packages or taught others how to use them,Q5_5,10,Translate prediction equations,NA
+R_3iKlvN1NAtJ1etU,I have contributed to tidymodels packages or taught others how to use them,Q5_6,0,Model stacking ,NA
+R_3iKlvN1NAtJ1etU,I have contributed to tidymodels packages or taught others how to use them,Q5_8,20,Post-processing in workflow(),NA
+R_3iKlvN1NAtJ1etU,I have contributed to tidymodels packages or taught others how to use them,Q5_9,30,Ignore recipe steps,NA
+R_3iKlvN1NAtJ1etU,I have contributed to tidymodels packages or taught others how to use them,Q5_10,0,H2O.ai support ,NA
+R_3iKlvN1NAtJ1etU,I have contributed to tidymodels packages or taught others how to use them,Q5_12,0,Other,NA
+R_BzawxihVBnnB3pL,I have used tidymodels packages many times,Q5_1,0,Survival analysis,NA
+R_BzawxihVBnnB3pL,I have used tidymodels packages many times,Q5_2,0,Support for sparse data structures,NA
+R_BzawxihVBnnB3pL,I have used tidymodels packages many times,Q5_3,20,Adaptive resampling and better parallelization,NA
+R_BzawxihVBnnB3pL,I have used tidymodels packages many times,Q5_4,0,"Model monitoring, updating, & organization",NA
+R_BzawxihVBnnB3pL,I have used tidymodels packages many times,Q5_5,0,Translate prediction equations,NA
+R_BzawxihVBnnB3pL,I have used tidymodels packages many times,Q5_6,25,Model stacking ,NA
+R_BzawxihVBnnB3pL,I have used tidymodels packages many times,Q5_8,25,Post-processing in workflow(),NA
+R_BzawxihVBnnB3pL,I have used tidymodels packages many times,Q5_9,10,Ignore recipe steps,NA
+R_BzawxihVBnnB3pL,I have used tidymodels packages many times,Q5_10,20,H2O.ai support ,NA
+R_BzawxihVBnnB3pL,I have used tidymodels packages many times,Q5_12,0,Other,NA
+R_3ne24SVCkYwNeXE,I have never used tidymodels,Q5_1,75,Survival analysis,NA
+R_3ne24SVCkYwNeXE,I have never used tidymodels,Q5_2,5,Support for sparse data structures,NA
+R_3ne24SVCkYwNeXE,I have never used tidymodels,Q5_3,0,Adaptive resampling and better parallelization,NA
+R_3ne24SVCkYwNeXE,I have never used tidymodels,Q5_4,10,"Model monitoring, updating, & organization",NA
+R_3ne24SVCkYwNeXE,I have never used tidymodels,Q5_5,5,Translate prediction equations,NA
+R_3ne24SVCkYwNeXE,I have never used tidymodels,Q5_6,0,Model stacking ,NA
+R_3ne24SVCkYwNeXE,I have never used tidymodels,Q5_8,0,Post-processing in workflow(),NA
+R_3ne24SVCkYwNeXE,I have never used tidymodels,Q5_9,0,Ignore recipe steps,NA
+R_3ne24SVCkYwNeXE,I have never used tidymodels,Q5_10,5,H2O.ai support ,NA
+R_3ne24SVCkYwNeXE,I have never used tidymodels,Q5_12,0,Other,NA
+R_25YPk3cXhY1Qqgu,I have used tidymodels packages a few times,Q5_1,0,Survival analysis,NA
+R_25YPk3cXhY1Qqgu,I have used tidymodels packages a few times,Q5_2,10,Support for sparse data structures,NA
+R_25YPk3cXhY1Qqgu,I have used tidymodels packages a few times,Q5_3,10,Adaptive resampling and better parallelization,NA
+R_25YPk3cXhY1Qqgu,I have used tidymodels packages a few times,Q5_4,5,"Model monitoring, updating, & organization",NA
+R_25YPk3cXhY1Qqgu,I have used tidymodels packages a few times,Q5_5,0,Translate prediction equations,NA
+R_25YPk3cXhY1Qqgu,I have used tidymodels packages a few times,Q5_6,15,Model stacking ,NA
+R_25YPk3cXhY1Qqgu,I have used tidymodels packages a few times,Q5_8,0,Post-processing in workflow(),NA
+R_25YPk3cXhY1Qqgu,I have used tidymodels packages a few times,Q5_9,0,Ignore recipe steps,NA
+R_25YPk3cXhY1Qqgu,I have used tidymodels packages a few times,Q5_10,0,H2O.ai support ,NA
+R_25YPk3cXhY1Qqgu,I have used tidymodels packages a few times,Q5_12,60,Other,Unsupervised Methods
+R_1eE0VqKIesYpLYZ,I have used tidymodels packages many times,Q5_1,10,Survival analysis,NA
+R_1eE0VqKIesYpLYZ,I have used tidymodels packages many times,Q5_2,0,Support for sparse data structures,NA
+R_1eE0VqKIesYpLYZ,I have used tidymodels packages many times,Q5_3,10,Adaptive resampling and better parallelization,NA
+R_1eE0VqKIesYpLYZ,I have used tidymodels packages many times,Q5_4,20,"Model monitoring, updating, & organization",NA
+R_1eE0VqKIesYpLYZ,I have used tidymodels packages many times,Q5_5,0,Translate prediction equations,NA
+R_1eE0VqKIesYpLYZ,I have used tidymodels packages many times,Q5_6,50,Model stacking ,NA
+R_1eE0VqKIesYpLYZ,I have used tidymodels packages many times,Q5_8,0,Post-processing in workflow(),NA
+R_1eE0VqKIesYpLYZ,I have used tidymodels packages many times,Q5_9,10,Ignore recipe steps,NA
+R_1eE0VqKIesYpLYZ,I have used tidymodels packages many times,Q5_10,0,H2O.ai support ,NA
+R_1eE0VqKIesYpLYZ,I have used tidymodels packages many times,Q5_12,0,Other,NA
+R_2aQqKCdDrUUWRye,I have used tidymodels packages a few times,Q5_1,0,Survival analysis,NA
+R_2aQqKCdDrUUWRye,I have used tidymodels packages a few times,Q5_2,0,Support for sparse data structures,NA
+R_2aQqKCdDrUUWRye,I have used tidymodels packages a few times,Q5_3,15,Adaptive resampling and better parallelization,NA
+R_2aQqKCdDrUUWRye,I have used tidymodels packages a few times,Q5_4,15,"Model monitoring, updating, & organization",NA
+R_2aQqKCdDrUUWRye,I have used tidymodels packages a few times,Q5_5,0,Translate prediction equations,NA
+R_2aQqKCdDrUUWRye,I have used tidymodels packages a few times,Q5_6,55,Model stacking ,NA
+R_2aQqKCdDrUUWRye,I have used tidymodels packages a few times,Q5_8,0,Post-processing in workflow(),NA
+R_2aQqKCdDrUUWRye,I have used tidymodels packages a few times,Q5_9,15,Ignore recipe steps,NA
+R_2aQqKCdDrUUWRye,I have used tidymodels packages a few times,Q5_10,0,H2O.ai support ,NA
+R_2aQqKCdDrUUWRye,I have used tidymodels packages a few times,Q5_12,0,Other,NA
+R_cYXCGZUs037AWeR,I have used tidymodels packages a few times,Q5_1,20,Survival analysis,NA
+R_cYXCGZUs037AWeR,I have used tidymodels packages a few times,Q5_2,20,Support for sparse data structures,NA
+R_cYXCGZUs037AWeR,I have used tidymodels packages a few times,Q5_3,10,Adaptive resampling and better parallelization,NA
+R_cYXCGZUs037AWeR,I have used tidymodels packages a few times,Q5_4,20,"Model monitoring, updating, & organization",NA
+R_cYXCGZUs037AWeR,I have used tidymodels packages a few times,Q5_5,0,Translate prediction equations,NA
+R_cYXCGZUs037AWeR,I have used tidymodels packages a few times,Q5_6,20,Model stacking ,NA
+R_cYXCGZUs037AWeR,I have used tidymodels packages a few times,Q5_8,10,Post-processing in workflow(),NA
+R_cYXCGZUs037AWeR,I have used tidymodels packages a few times,Q5_9,0,Ignore recipe steps,NA
+R_cYXCGZUs037AWeR,I have used tidymodels packages a few times,Q5_10,0,H2O.ai support ,NA
+R_cYXCGZUs037AWeR,I have used tidymodels packages a few times,Q5_12,0,Other,NA
+R_2uNXy2lolNIYHHp,I have used tidymodels packages a few times,Q5_1,20,Survival analysis,NA
+R_2uNXy2lolNIYHHp,I have used tidymodels packages a few times,Q5_2,20,Support for sparse data structures,NA
+R_2uNXy2lolNIYHHp,I have used tidymodels packages a few times,Q5_3,0,Adaptive resampling and better parallelization,NA
+R_2uNXy2lolNIYHHp,I have used tidymodels packages a few times,Q5_4,0,"Model monitoring, updating, & organization",NA
+R_2uNXy2lolNIYHHp,I have used tidymodels packages a few times,Q5_5,40,Translate prediction equations,NA
+R_2uNXy2lolNIYHHp,I have used tidymodels packages a few times,Q5_6,20,Model stacking ,NA
+R_2uNXy2lolNIYHHp,I have used tidymodels packages a few times,Q5_8,0,Post-processing in workflow(),NA
+R_2uNXy2lolNIYHHp,I have used tidymodels packages a few times,Q5_9,0,Ignore recipe steps,NA
+R_2uNXy2lolNIYHHp,I have used tidymodels packages a few times,Q5_10,0,H2O.ai support ,NA
+R_2uNXy2lolNIYHHp,I have used tidymodels packages a few times,Q5_12,0,Other,NA
+R_ys7j3ubJvmmSlJ7,I have never used tidymodels,Q5_1,0,Survival analysis,NA
+R_ys7j3ubJvmmSlJ7,I have never used tidymodels,Q5_2,25,Support for sparse data structures,NA
+R_ys7j3ubJvmmSlJ7,I have never used tidymodels,Q5_3,0,Adaptive resampling and better parallelization,NA
+R_ys7j3ubJvmmSlJ7,I have never used tidymodels,Q5_4,0,"Model monitoring, updating, & organization",NA
+R_ys7j3ubJvmmSlJ7,I have never used tidymodels,Q5_5,50,Translate prediction equations,NA
+R_ys7j3ubJvmmSlJ7,I have never used tidymodels,Q5_6,10,Model stacking ,NA
+R_ys7j3ubJvmmSlJ7,I have never used tidymodels,Q5_8,15,Post-processing in workflow(),NA
+R_ys7j3ubJvmmSlJ7,I have never used tidymodels,Q5_9,0,Ignore recipe steps,NA
+R_ys7j3ubJvmmSlJ7,I have never used tidymodels,Q5_10,0,H2O.ai support ,NA
+R_ys7j3ubJvmmSlJ7,I have never used tidymodels,Q5_12,0,Other,NA
+R_3CVJv2WA44e5D8w,I have used tidymodels packages a few times,Q5_1,5,Survival analysis,NA
+R_3CVJv2WA44e5D8w,I have used tidymodels packages a few times,Q5_2,5,Support for sparse data structures,NA
+R_3CVJv2WA44e5D8w,I have used tidymodels packages a few times,Q5_3,20,Adaptive resampling and better parallelization,NA
+R_3CVJv2WA44e5D8w,I have used tidymodels packages a few times,Q5_4,5,"Model monitoring, updating, & organization",NA
+R_3CVJv2WA44e5D8w,I have used tidymodels packages a few times,Q5_5,5,Translate prediction equations,NA
+R_3CVJv2WA44e5D8w,I have used tidymodels packages a few times,Q5_6,40,Model stacking ,NA
+R_3CVJv2WA44e5D8w,I have used tidymodels packages a few times,Q5_8,5,Post-processing in workflow(),NA
+R_3CVJv2WA44e5D8w,I have used tidymodels packages a few times,Q5_9,10,Ignore recipe steps,NA
+R_3CVJv2WA44e5D8w,I have used tidymodels packages a few times,Q5_10,5,H2O.ai support ,NA
+R_3CVJv2WA44e5D8w,I have used tidymodels packages a few times,Q5_12,0,Other,NA
+R_3jZZuPxUa1omYrW,I have used tidymodels packages a few times,Q5_1,20,Survival analysis,NA
+R_3jZZuPxUa1omYrW,I have used tidymodels packages a few times,Q5_2,15,Support for sparse data structures,NA
+R_3jZZuPxUa1omYrW,I have used tidymodels packages a few times,Q5_3,0,Adaptive resampling and better parallelization,NA
+R_3jZZuPxUa1omYrW,I have used tidymodels packages a few times,Q5_4,50,"Model monitoring, updating, & organization",NA
+R_3jZZuPxUa1omYrW,I have used tidymodels packages a few times,Q5_5,0,Translate prediction equations,NA
+R_3jZZuPxUa1omYrW,I have used tidymodels packages a few times,Q5_6,0,Model stacking ,NA
+R_3jZZuPxUa1omYrW,I have used tidymodels packages a few times,Q5_8,15,Post-processing in workflow(),NA
+R_3jZZuPxUa1omYrW,I have used tidymodels packages a few times,Q5_9,0,Ignore recipe steps,NA
+R_3jZZuPxUa1omYrW,I have used tidymodels packages a few times,Q5_10,0,H2O.ai support ,NA
+R_3jZZuPxUa1omYrW,I have used tidymodels packages a few times,Q5_12,0,Other,NA
+R_3CBjhw9XMozex0w,I have never used tidymodels,Q5_1,5,Survival analysis,NA
+R_3CBjhw9XMozex0w,I have never used tidymodels,Q5_2,0,Support for sparse data structures,NA
+R_3CBjhw9XMozex0w,I have never used tidymodels,Q5_3,30,Adaptive resampling and better parallelization,NA
+R_3CBjhw9XMozex0w,I have never used tidymodels,Q5_4,5,"Model monitoring, updating, & organization",NA
+R_3CBjhw9XMozex0w,I have never used tidymodels,Q5_5,0,Translate prediction equations,NA
+R_3CBjhw9XMozex0w,I have never used tidymodels,Q5_6,30,Model stacking ,NA
+R_3CBjhw9XMozex0w,I have never used tidymodels,Q5_8,10,Post-processing in workflow(),NA
+R_3CBjhw9XMozex0w,I have never used tidymodels,Q5_9,0,Ignore recipe steps,NA
+R_3CBjhw9XMozex0w,I have never used tidymodels,Q5_10,20,H2O.ai support ,NA
+R_3CBjhw9XMozex0w,I have never used tidymodels,Q5_12,0,Other,NA
+R_3QSfO2prrMcafnR,I have used tidymodels packages a few times,Q5_1,10,Survival analysis,NA
+R_3QSfO2prrMcafnR,I have used tidymodels packages a few times,Q5_2,0,Support for sparse data structures,NA
+R_3QSfO2prrMcafnR,I have used tidymodels packages a few times,Q5_3,10,Adaptive resampling and better parallelization,NA
+R_3QSfO2prrMcafnR,I have used tidymodels packages a few times,Q5_4,25,"Model monitoring, updating, & organization",NA
+R_3QSfO2prrMcafnR,I have used tidymodels packages a few times,Q5_5,20,Translate prediction equations,NA
+R_3QSfO2prrMcafnR,I have used tidymodels packages a few times,Q5_6,5,Model stacking ,NA
+R_3QSfO2prrMcafnR,I have used tidymodels packages a few times,Q5_8,0,Post-processing in workflow(),NA
+R_3QSfO2prrMcafnR,I have used tidymodels packages a few times,Q5_9,0,Ignore recipe steps,NA
+R_3QSfO2prrMcafnR,I have used tidymodels packages a few times,Q5_10,0,H2O.ai support ,NA
+R_3QSfO2prrMcafnR,I have used tidymodels packages a few times,Q5_12,30,Other,Visualizations of model output
+R_1Ck0DuoBMUZzFlI,I have used tidymodels packages a few times,Q5_1,0,Survival analysis,NA
+R_1Ck0DuoBMUZzFlI,I have used tidymodels packages a few times,Q5_2,0,Support for sparse data structures,NA
+R_1Ck0DuoBMUZzFlI,I have used tidymodels packages a few times,Q5_3,20,Adaptive resampling and better parallelization,NA
+R_1Ck0DuoBMUZzFlI,I have used tidymodels packages a few times,Q5_4,10,"Model monitoring, updating, & organization",NA
+R_1Ck0DuoBMUZzFlI,I have used tidymodels packages a few times,Q5_5,0,Translate prediction equations,NA
+R_1Ck0DuoBMUZzFlI,I have used tidymodels packages a few times,Q5_6,30,Model stacking ,NA
+R_1Ck0DuoBMUZzFlI,I have used tidymodels packages a few times,Q5_8,30,Post-processing in workflow(),NA
+R_1Ck0DuoBMUZzFlI,I have used tidymodels packages a few times,Q5_9,0,Ignore recipe steps,NA
+R_1Ck0DuoBMUZzFlI,I have used tidymodels packages a few times,Q5_10,0,H2O.ai support ,NA
+R_1Ck0DuoBMUZzFlI,I have used tidymodels packages a few times,Q5_12,10,Other,"Latent variable models (e.g., structural equation modeling, item response theory)"
+R_POpuF0PbjggmKxH,I have used tidymodels packages a few times,Q5_1,33,Survival analysis,NA
+R_POpuF0PbjggmKxH,I have used tidymodels packages a few times,Q5_2,33,Support for sparse data structures,NA
+R_POpuF0PbjggmKxH,I have used tidymodels packages a few times,Q5_3,0,Adaptive resampling and better parallelization,NA
+R_POpuF0PbjggmKxH,I have used tidymodels packages a few times,Q5_4,34,"Model monitoring, updating, & organization",NA
+R_POpuF0PbjggmKxH,I have used tidymodels packages a few times,Q5_5,0,Translate prediction equations,NA
+R_POpuF0PbjggmKxH,I have used tidymodels packages a few times,Q5_6,0,Model stacking ,NA
+R_POpuF0PbjggmKxH,I have used tidymodels packages a few times,Q5_8,0,Post-processing in workflow(),NA
+R_POpuF0PbjggmKxH,I have used tidymodels packages a few times,Q5_9,0,Ignore recipe steps,NA
+R_POpuF0PbjggmKxH,I have used tidymodels packages a few times,Q5_10,0,H2O.ai support ,NA
+R_POpuF0PbjggmKxH,I have used tidymodels packages a few times,Q5_12,0,Other,NA
+R_1mfqHxYmM0rtZcf,I have never used tidymodels,Q5_1,5,Survival analysis,NA
+R_1mfqHxYmM0rtZcf,I have never used tidymodels,Q5_2,0,Support for sparse data structures,NA
+R_1mfqHxYmM0rtZcf,I have never used tidymodels,Q5_3,0,Adaptive resampling and better parallelization,NA
+R_1mfqHxYmM0rtZcf,I have never used tidymodels,Q5_4,15,"Model monitoring, updating, & organization",NA
+R_1mfqHxYmM0rtZcf,I have never used tidymodels,Q5_5,0,Translate prediction equations,NA
+R_1mfqHxYmM0rtZcf,I have never used tidymodels,Q5_6,20,Model stacking ,NA
+R_1mfqHxYmM0rtZcf,I have never used tidymodels,Q5_8,20,Post-processing in workflow(),NA
+R_1mfqHxYmM0rtZcf,I have never used tidymodels,Q5_9,10,Ignore recipe steps,NA
+R_1mfqHxYmM0rtZcf,I have never used tidymodels,Q5_10,0,H2O.ai support ,NA
+R_1mfqHxYmM0rtZcf,I have never used tidymodels,Q5_12,30,Other,Unsupervised models (clustering)
+R_3hfNZ45XfPBsScU,I have used tidymodels packages a few times,Q5_1,0,Survival analysis,NA
+R_3hfNZ45XfPBsScU,I have used tidymodels packages a few times,Q5_2,0,Support for sparse data structures,NA
+R_3hfNZ45XfPBsScU,I have used tidymodels packages a few times,Q5_3,0,Adaptive resampling and better parallelization,NA
+R_3hfNZ45XfPBsScU,I have used tidymodels packages a few times,Q5_4,15,"Model monitoring, updating, & organization",NA
+R_3hfNZ45XfPBsScU,I have used tidymodels packages a few times,Q5_5,35,Translate prediction equations,NA
+R_3hfNZ45XfPBsScU,I have used tidymodels packages a few times,Q5_6,50,Model stacking ,NA
+R_3hfNZ45XfPBsScU,I have used tidymodels packages a few times,Q5_8,0,Post-processing in workflow(),NA
+R_3hfNZ45XfPBsScU,I have used tidymodels packages a few times,Q5_9,0,Ignore recipe steps,NA
+R_3hfNZ45XfPBsScU,I have used tidymodels packages a few times,Q5_10,0,H2O.ai support ,NA
+R_3hfNZ45XfPBsScU,I have used tidymodels packages a few times,Q5_12,0,Other,NA
+R_1i4Z11cJRbii8V6,I have used tidymodels packages many times,Q5_1,0,Survival analysis,NA
+R_1i4Z11cJRbii8V6,I have used tidymodels packages many times,Q5_2,0,Support for sparse data structures,NA
+R_1i4Z11cJRbii8V6,I have used tidymodels packages many times,Q5_3,20,Adaptive resampling and better parallelization,NA
+R_1i4Z11cJRbii8V6,I have used tidymodels packages many times,Q5_4,30,"Model monitoring, updating, & organization",NA
+R_1i4Z11cJRbii8V6,I have used tidymodels packages many times,Q5_5,0,Translate prediction equations,NA
+R_1i4Z11cJRbii8V6,I have used tidymodels packages many times,Q5_6,0,Model stacking ,NA
+R_1i4Z11cJRbii8V6,I have used tidymodels packages many times,Q5_8,0,Post-processing in workflow(),NA
+R_1i4Z11cJRbii8V6,I have used tidymodels packages many times,Q5_9,0,Ignore recipe steps,NA
+R_1i4Z11cJRbii8V6,I have used tidymodels packages many times,Q5_10,50,H2O.ai support ,NA
+R_1i4Z11cJRbii8V6,I have used tidymodels packages many times,Q5_12,0,Other,NA
+R_0MtRxXDtB7WoMc9,I have used tidymodels packages many times,Q5_1,0,Survival analysis,NA
+R_0MtRxXDtB7WoMc9,I have used tidymodels packages many times,Q5_2,0,Support for sparse data structures,NA
+R_0MtRxXDtB7WoMc9,I have used tidymodels packages many times,Q5_3,20,Adaptive resampling and better parallelization,NA
+R_0MtRxXDtB7WoMc9,I have used tidymodels packages many times,Q5_4,0,"Model monitoring, updating, & organization",NA
+R_0MtRxXDtB7WoMc9,I have used tidymodels packages many times,Q5_5,0,Translate prediction equations,NA
+R_0MtRxXDtB7WoMc9,I have used tidymodels packages many times,Q5_6,30,Model stacking ,NA
+R_0MtRxXDtB7WoMc9,I have used tidymodels packages many times,Q5_8,20,Post-processing in workflow(),NA
+R_0MtRxXDtB7WoMc9,I have used tidymodels packages many times,Q5_9,0,Ignore recipe steps,NA
+R_0MtRxXDtB7WoMc9,I have used tidymodels packages many times,Q5_10,30,H2O.ai support ,NA
+R_0MtRxXDtB7WoMc9,I have used tidymodels packages many times,Q5_12,0,Other,NA
+R_6rOGEekvE6mANMd,I have used tidymodels packages a few times,Q5_1,0,Survival analysis,NA
+R_6rOGEekvE6mANMd,I have used tidymodels packages a few times,Q5_2,5,Support for sparse data structures,NA
+R_6rOGEekvE6mANMd,I have used tidymodels packages a few times,Q5_3,5,Adaptive resampling and better parallelization,NA
+R_6rOGEekvE6mANMd,I have used tidymodels packages a few times,Q5_4,20,"Model monitoring, updating, & organization",NA
+R_6rOGEekvE6mANMd,I have used tidymodels packages a few times,Q5_5,5,Translate prediction equations,NA
+R_6rOGEekvE6mANMd,I have used tidymodels packages a few times,Q5_6,40,Model stacking ,NA
+R_6rOGEekvE6mANMd,I have used tidymodels packages a few times,Q5_8,5,Post-processing in workflow(),NA
+R_6rOGEekvE6mANMd,I have used tidymodels packages a few times,Q5_9,0,Ignore recipe steps,NA
+R_6rOGEekvE6mANMd,I have used tidymodels packages a few times,Q5_10,20,H2O.ai support ,NA
+R_6rOGEekvE6mANMd,I have used tidymodels packages a few times,Q5_12,0,Other,NA
+R_2w5ChE3Bii0WOX3,I have used tidymodels packages many times,Q5_1,0,Survival analysis,NA
+R_2w5ChE3Bii0WOX3,I have used tidymodels packages many times,Q5_2,0,Support for sparse data structures,NA
+R_2w5ChE3Bii0WOX3,I have used tidymodels packages many times,Q5_3,30,Adaptive resampling and better parallelization,NA
+R_2w5ChE3Bii0WOX3,I have used tidymodels packages many times,Q5_4,10,"Model monitoring, updating, & organization",NA
+R_2w5ChE3Bii0WOX3,I have used tidymodels packages many times,Q5_5,0,Translate prediction equations,NA
+R_2w5ChE3Bii0WOX3,I have used tidymodels packages many times,Q5_6,30,Model stacking ,NA
+R_2w5ChE3Bii0WOX3,I have used tidymodels packages many times,Q5_8,20,Post-processing in workflow(),NA
+R_2w5ChE3Bii0WOX3,I have used tidymodels packages many times,Q5_9,5,Ignore recipe steps,NA
+R_2w5ChE3Bii0WOX3,I have used tidymodels packages many times,Q5_10,5,H2O.ai support ,NA
+R_2w5ChE3Bii0WOX3,I have used tidymodels packages many times,Q5_12,0,Other,NA
+R_2VOUxL1ryXJiW8b,I have used tidymodels packages a few times,Q5_1,0,Survival analysis,NA
+R_2VOUxL1ryXJiW8b,I have used tidymodels packages a few times,Q5_2,0,Support for sparse data structures,NA
+R_2VOUxL1ryXJiW8b,I have used tidymodels packages a few times,Q5_3,0,Adaptive resampling and better parallelization,NA
+R_2VOUxL1ryXJiW8b,I have used tidymodels packages a few times,Q5_4,20,"Model monitoring, updating, & organization",NA
+R_2VOUxL1ryXJiW8b,I have used tidymodels packages a few times,Q5_5,0,Translate prediction equations,NA
+R_2VOUxL1ryXJiW8b,I have used tidymodels packages a few times,Q5_6,0,Model stacking ,NA
+R_2VOUxL1ryXJiW8b,I have used tidymodels packages a few times,Q5_8,0,Post-processing in workflow(),NA
+R_2VOUxL1ryXJiW8b,I have used tidymodels packages a few times,Q5_9,0,Ignore recipe steps,NA
+R_2VOUxL1ryXJiW8b,I have used tidymodels packages a few times,Q5_10,80,H2O.ai support ,NA
+R_2VOUxL1ryXJiW8b,I have used tidymodels packages a few times,Q5_12,0,Other,NA
+R_3hnhSkf9F7m6x6u,I have contributed to tidymodels packages or taught others how to use them,Q5_1,0,Survival analysis,NA
+R_3hnhSkf9F7m6x6u,I have contributed to tidymodels packages or taught others how to use them,Q5_2,0,Support for sparse data structures,NA
+R_3hnhSkf9F7m6x6u,I have contributed to tidymodels packages or taught others how to use them,Q5_3,0,Adaptive resampling and better parallelization,NA
+R_3hnhSkf9F7m6x6u,I have contributed to tidymodels packages or taught others how to use them,Q5_4,25,"Model monitoring, updating, & organization",NA
+R_3hnhSkf9F7m6x6u,I have contributed to tidymodels packages or taught others how to use them,Q5_5,15,Translate prediction equations,NA
+R_3hnhSkf9F7m6x6u,I have contributed to tidymodels packages or taught others how to use them,Q5_6,50,Model stacking ,NA
+R_3hnhSkf9F7m6x6u,I have contributed to tidymodels packages or taught others how to use them,Q5_8,10,Post-processing in workflow(),NA
+R_3hnhSkf9F7m6x6u,I have contributed to tidymodels packages or taught others how to use them,Q5_9,0,Ignore recipe steps,NA
+R_3hnhSkf9F7m6x6u,I have contributed to tidymodels packages or taught others how to use them,Q5_10,0,H2O.ai support ,NA
+R_3hnhSkf9F7m6x6u,I have contributed to tidymodels packages or taught others how to use them,Q5_12,0,Other,NA
+R_31XZSSJ85RnbUYf,I have used tidymodels packages a few times,Q5_1,10,Survival analysis,NA
+R_31XZSSJ85RnbUYf,I have used tidymodels packages a few times,Q5_2,0,Support for sparse data structures,NA
+R_31XZSSJ85RnbUYf,I have used tidymodels packages a few times,Q5_3,20,Adaptive resampling and better parallelization,NA
+R_31XZSSJ85RnbUYf,I have used tidymodels packages a few times,Q5_4,20,"Model monitoring, updating, & organization",NA
+R_31XZSSJ85RnbUYf,I have used tidymodels packages a few times,Q5_5,0,Translate prediction equations,NA
+R_31XZSSJ85RnbUYf,I have used tidymodels packages a few times,Q5_6,20,Model stacking ,NA
+R_31XZSSJ85RnbUYf,I have used tidymodels packages a few times,Q5_8,0,Post-processing in workflow(),NA
+R_31XZSSJ85RnbUYf,I have used tidymodels packages a few times,Q5_9,0,Ignore recipe steps,NA
+R_31XZSSJ85RnbUYf,I have used tidymodels packages a few times,Q5_10,30,H2O.ai support ,NA
+R_31XZSSJ85RnbUYf,I have used tidymodels packages a few times,Q5_12,0,Other,NA
+R_3QPGJA7CTCVlpf7,I have used tidymodels packages many times,Q5_1,25,Survival analysis,NA
+R_3QPGJA7CTCVlpf7,I have used tidymodels packages many times,Q5_2,0,Support for sparse data structures,NA
+R_3QPGJA7CTCVlpf7,I have used tidymodels packages many times,Q5_3,20,Adaptive resampling and better parallelization,NA
+R_3QPGJA7CTCVlpf7,I have used tidymodels packages many times,Q5_4,15,"Model monitoring, updating, & organization",NA
+R_3QPGJA7CTCVlpf7,I have used tidymodels packages many times,Q5_5,0,Translate prediction equations,NA
+R_3QPGJA7CTCVlpf7,I have used tidymodels packages many times,Q5_6,20,Model stacking ,NA
+R_3QPGJA7CTCVlpf7,I have used tidymodels packages many times,Q5_8,20,Post-processing in workflow(),NA
+R_3QPGJA7CTCVlpf7,I have used tidymodels packages many times,Q5_9,0,Ignore recipe steps,NA
+R_3QPGJA7CTCVlpf7,I have used tidymodels packages many times,Q5_10,0,H2O.ai support ,NA
+R_3QPGJA7CTCVlpf7,I have used tidymodels packages many times,Q5_12,0,Other,NA
+R_PBumXrCLn3B5v3P,I have used tidymodels packages a few times,Q5_1,0,Survival analysis,NA
+R_PBumXrCLn3B5v3P,I have used tidymodels packages a few times,Q5_2,0,Support for sparse data structures,NA
+R_PBumXrCLn3B5v3P,I have used tidymodels packages a few times,Q5_3,0,Adaptive resampling and better parallelization,NA
+R_PBumXrCLn3B5v3P,I have used tidymodels packages a few times,Q5_4,50,"Model monitoring, updating, & organization",NA
+R_PBumXrCLn3B5v3P,I have used tidymodels packages a few times,Q5_5,30,Translate prediction equations,NA
+R_PBumXrCLn3B5v3P,I have used tidymodels packages a few times,Q5_6,0,Model stacking ,NA
+R_PBumXrCLn3B5v3P,I have used tidymodels packages a few times,Q5_8,0,Post-processing in workflow(),NA
+R_PBumXrCLn3B5v3P,I have used tidymodels packages a few times,Q5_9,0,Ignore recipe steps,NA
+R_PBumXrCLn3B5v3P,I have used tidymodels packages a few times,Q5_10,20,H2O.ai support ,NA
+R_PBumXrCLn3B5v3P,I have used tidymodels packages a few times,Q5_12,0,Other,NA
+R_3fTZyVCtgoZJBXe,I have used tidymodels packages a few times,Q5_1,5,Survival analysis,NA
+R_3fTZyVCtgoZJBXe,I have used tidymodels packages a few times,Q5_2,0,Support for sparse data structures,NA
+R_3fTZyVCtgoZJBXe,I have used tidymodels packages a few times,Q5_3,0,Adaptive resampling and better parallelization,NA
+R_3fTZyVCtgoZJBXe,I have used tidymodels packages a few times,Q5_4,30,"Model monitoring, updating, & organization",NA
+R_3fTZyVCtgoZJBXe,I have used tidymodels packages a few times,Q5_5,5,Translate prediction equations,NA
+R_3fTZyVCtgoZJBXe,I have used tidymodels packages a few times,Q5_6,15,Model stacking ,NA
+R_3fTZyVCtgoZJBXe,I have used tidymodels packages a few times,Q5_8,30,Post-processing in workflow(),NA
+R_3fTZyVCtgoZJBXe,I have used tidymodels packages a few times,Q5_9,5,Ignore recipe steps,NA
+R_3fTZyVCtgoZJBXe,I have used tidymodels packages a few times,Q5_10,10,H2O.ai support ,NA
+R_3fTZyVCtgoZJBXe,I have used tidymodels packages a few times,Q5_12,0,Other,NA
+R_1ietGLbDsgonoCp,I have used tidymodels packages many times,Q5_1,60,Survival analysis,NA
+R_1ietGLbDsgonoCp,I have used tidymodels packages many times,Q5_2,0,Support for sparse data structures,NA
+R_1ietGLbDsgonoCp,I have used tidymodels packages many times,Q5_3,20,Adaptive resampling and better parallelization,NA
+R_1ietGLbDsgonoCp,I have used tidymodels packages many times,Q5_4,10,"Model monitoring, updating, & organization",NA
+R_1ietGLbDsgonoCp,I have used tidymodels packages many times,Q5_5,0,Translate prediction equations,NA
+R_1ietGLbDsgonoCp,I have used tidymodels packages many times,Q5_6,5,Model stacking ,NA
+R_1ietGLbDsgonoCp,I have used tidymodels packages many times,Q5_8,5,Post-processing in workflow(),NA
+R_1ietGLbDsgonoCp,I have used tidymodels packages many times,Q5_9,0,Ignore recipe steps,NA
+R_1ietGLbDsgonoCp,I have used tidymodels packages many times,Q5_10,0,H2O.ai support ,NA
+R_1ietGLbDsgonoCp,I have used tidymodels packages many times,Q5_12,0,Other,NA
+R_26mxakqgqtjTieX,I have used tidymodels packages a few times,Q5_1,0,Survival analysis,NA
+R_26mxakqgqtjTieX,I have used tidymodels packages a few times,Q5_2,0,Support for sparse data structures,NA
+R_26mxakqgqtjTieX,I have used tidymodels packages a few times,Q5_3,40,Adaptive resampling and better parallelization,NA
+R_26mxakqgqtjTieX,I have used tidymodels packages a few times,Q5_4,20,"Model monitoring, updating, & organization",NA
+R_26mxakqgqtjTieX,I have used tidymodels packages a few times,Q5_5,0,Translate prediction equations,NA
+R_26mxakqgqtjTieX,I have used tidymodels packages a few times,Q5_6,0,Model stacking ,NA
+R_26mxakqgqtjTieX,I have used tidymodels packages a few times,Q5_8,0,Post-processing in workflow(),NA
+R_26mxakqgqtjTieX,I have used tidymodels packages a few times,Q5_9,0,Ignore recipe steps,NA
+R_26mxakqgqtjTieX,I have used tidymodels packages a few times,Q5_10,40,H2O.ai support ,NA
+R_26mxakqgqtjTieX,I have used tidymodels packages a few times,Q5_12,0,Other,NA
+R_2rZKxlItNpDvSPe,I have contributed to tidymodels packages or taught others how to use them,Q5_1,0,Survival analysis,NA
+R_2rZKxlItNpDvSPe,I have contributed to tidymodels packages or taught others how to use them,Q5_2,0,Support for sparse data structures,NA
+R_2rZKxlItNpDvSPe,I have contributed to tidymodels packages or taught others how to use them,Q5_3,0,Adaptive resampling and better parallelization,NA
+R_2rZKxlItNpDvSPe,I have contributed to tidymodels packages or taught others how to use them,Q5_4,50,"Model monitoring, updating, & organization",NA
+R_2rZKxlItNpDvSPe,I have contributed to tidymodels packages or taught others how to use them,Q5_5,0,Translate prediction equations,NA
+R_2rZKxlItNpDvSPe,I have contributed to tidymodels packages or taught others how to use them,Q5_6,0,Model stacking ,NA
+R_2rZKxlItNpDvSPe,I have contributed to tidymodels packages or taught others how to use them,Q5_8,0,Post-processing in workflow(),NA
+R_2rZKxlItNpDvSPe,I have contributed to tidymodels packages or taught others how to use them,Q5_9,50,Ignore recipe steps,NA
+R_2rZKxlItNpDvSPe,I have contributed to tidymodels packages or taught others how to use them,Q5_10,0,H2O.ai support ,NA
+R_2rZKxlItNpDvSPe,I have contributed to tidymodels packages or taught others how to use them,Q5_12,0,Other,NA
+R_2rlaNYOgL722sTX,I have used tidymodels packages a few times,Q5_1,20,Survival analysis,NA
+R_2rlaNYOgL722sTX,I have used tidymodels packages a few times,Q5_2,0,Support for sparse data structures,NA
+R_2rlaNYOgL722sTX,I have used tidymodels packages a few times,Q5_3,0,Adaptive resampling and better parallelization,NA
+R_2rlaNYOgL722sTX,I have used tidymodels packages a few times,Q5_4,15,"Model monitoring, updating, & organization",NA
+R_2rlaNYOgL722sTX,I have used tidymodels packages a few times,Q5_5,25,Translate prediction equations,NA
+R_2rlaNYOgL722sTX,I have used tidymodels packages a few times,Q5_6,0,Model stacking ,NA
+R_2rlaNYOgL722sTX,I have used tidymodels packages a few times,Q5_8,0,Post-processing in workflow(),NA
+R_2rlaNYOgL722sTX,I have used tidymodels packages a few times,Q5_9,10,Ignore recipe steps,NA
+R_2rlaNYOgL722sTX,I have used tidymodels packages a few times,Q5_10,30,H2O.ai support ,NA
+R_2rlaNYOgL722sTX,I have used tidymodels packages a few times,Q5_12,0,Other,NA
+R_RRLUDMnF2RFrqgh,I have used tidymodels packages a few times,Q5_1,50,Survival analysis,NA
+R_RRLUDMnF2RFrqgh,I have used tidymodels packages a few times,Q5_2,0,Support for sparse data structures,NA
+R_RRLUDMnF2RFrqgh,I have used tidymodels packages a few times,Q5_3,0,Adaptive resampling and better parallelization,NA
+R_RRLUDMnF2RFrqgh,I have used tidymodels packages a few times,Q5_4,20,"Model monitoring, updating, & organization",NA
+R_RRLUDMnF2RFrqgh,I have used tidymodels packages a few times,Q5_5,0,Translate prediction equations,NA
+R_RRLUDMnF2RFrqgh,I have used tidymodels packages a few times,Q5_6,10,Model stacking ,NA
+R_RRLUDMnF2RFrqgh,I have used tidymodels packages a few times,Q5_8,0,Post-processing in workflow(),NA
+R_RRLUDMnF2RFrqgh,I have used tidymodels packages a few times,Q5_9,10,Ignore recipe steps,NA
+R_RRLUDMnF2RFrqgh,I have used tidymodels packages a few times,Q5_10,0,H2O.ai support ,NA
+R_RRLUDMnF2RFrqgh,I have used tidymodels packages a few times,Q5_12,10,Other,Timeseries
+R_DouxI0sbsJ9ufId,I have used tidymodels packages many times,Q5_1,0,Survival analysis,NA
+R_DouxI0sbsJ9ufId,I have used tidymodels packages many times,Q5_2,0,Support for sparse data structures,NA
+R_DouxI0sbsJ9ufId,I have used tidymodels packages many times,Q5_3,10,Adaptive resampling and better parallelization,NA
+R_DouxI0sbsJ9ufId,I have used tidymodels packages many times,Q5_4,20,"Model monitoring, updating, & organization",NA
+R_DouxI0sbsJ9ufId,I have used tidymodels packages many times,Q5_5,40,Translate prediction equations,NA
+R_DouxI0sbsJ9ufId,I have used tidymodels packages many times,Q5_6,0,Model stacking ,NA
+R_DouxI0sbsJ9ufId,I have used tidymodels packages many times,Q5_8,10,Post-processing in workflow(),NA
+R_DouxI0sbsJ9ufId,I have used tidymodels packages many times,Q5_9,20,Ignore recipe steps,NA
+R_DouxI0sbsJ9ufId,I have used tidymodels packages many times,Q5_10,0,H2O.ai support ,NA
+R_DouxI0sbsJ9ufId,I have used tidymodels packages many times,Q5_12,0,Other,NA
+R_2YYgiHFKHYatvDE,I have never used tidymodels,Q5_1,50,Survival analysis,NA
+R_2YYgiHFKHYatvDE,I have never used tidymodels,Q5_2,20,Support for sparse data structures,NA
+R_2YYgiHFKHYatvDE,I have never used tidymodels,Q5_3,0,Adaptive resampling and better parallelization,NA
+R_2YYgiHFKHYatvDE,I have never used tidymodels,Q5_4,0,"Model monitoring, updating, & organization",NA
+R_2YYgiHFKHYatvDE,I have never used tidymodels,Q5_5,10,Translate prediction equations,NA
+R_2YYgiHFKHYatvDE,I have never used tidymodels,Q5_6,0,Model stacking ,NA
+R_2YYgiHFKHYatvDE,I have never used tidymodels,Q5_8,0,Post-processing in workflow(),NA
+R_2YYgiHFKHYatvDE,I have never used tidymodels,Q5_9,0,Ignore recipe steps,NA
+R_2YYgiHFKHYatvDE,I have never used tidymodels,Q5_10,0,H2O.ai support ,NA
+R_2YYgiHFKHYatvDE,I have never used tidymodels,Q5_12,20,Other,Gaussian processes
+R_3qvuyNiwBcGn0Z3,I have used tidymodels packages a few times,Q5_1,10,Survival analysis,NA
+R_3qvuyNiwBcGn0Z3,I have used tidymodels packages a few times,Q5_2,10,Support for sparse data structures,NA
+R_3qvuyNiwBcGn0Z3,I have used tidymodels packages a few times,Q5_3,40,Adaptive resampling and better parallelization,NA
+R_3qvuyNiwBcGn0Z3,I have used tidymodels packages a few times,Q5_4,30,"Model monitoring, updating, & organization",NA
+R_3qvuyNiwBcGn0Z3,I have used tidymodels packages a few times,Q5_5,0,Translate prediction equations,NA
+R_3qvuyNiwBcGn0Z3,I have used tidymodels packages a few times,Q5_6,0,Model stacking ,NA
+R_3qvuyNiwBcGn0Z3,I have used tidymodels packages a few times,Q5_8,0,Post-processing in workflow(),NA
+R_3qvuyNiwBcGn0Z3,I have used tidymodels packages a few times,Q5_9,0,Ignore recipe steps,NA
+R_3qvuyNiwBcGn0Z3,I have used tidymodels packages a few times,Q5_10,10,H2O.ai support ,NA
+R_3qvuyNiwBcGn0Z3,I have used tidymodels packages a few times,Q5_12,0,Other,NA
+R_x4TpQnrNMeAvc0V,I have used tidymodels packages many times,Q5_1,35,Survival analysis,NA
+R_x4TpQnrNMeAvc0V,I have used tidymodels packages many times,Q5_2,25,Support for sparse data structures,NA
+R_x4TpQnrNMeAvc0V,I have used tidymodels packages many times,Q5_3,0,Adaptive resampling and better parallelization,NA
+R_x4TpQnrNMeAvc0V,I have used tidymodels packages many times,Q5_4,20,"Model monitoring, updating, & organization",NA
+R_x4TpQnrNMeAvc0V,I have used tidymodels packages many times,Q5_5,0,Translate prediction equations,NA
+R_x4TpQnrNMeAvc0V,I have used tidymodels packages many times,Q5_6,10,Model stacking ,NA
+R_x4TpQnrNMeAvc0V,I have used tidymodels packages many times,Q5_8,10,Post-processing in workflow(),NA
+R_x4TpQnrNMeAvc0V,I have used tidymodels packages many times,Q5_9,0,Ignore recipe steps,NA
+R_x4TpQnrNMeAvc0V,I have used tidymodels packages many times,Q5_10,0,H2O.ai support ,NA
+R_x4TpQnrNMeAvc0V,I have used tidymodels packages many times,Q5_12,0,Other,NA
+R_247SqmKSrZNxkwE,I have never used tidymodels,Q5_1,0,Survival analysis,NA
+R_247SqmKSrZNxkwE,I have never used tidymodels,Q5_2,20,Support for sparse data structures,NA
+R_247SqmKSrZNxkwE,I have never used tidymodels,Q5_3,30,Adaptive resampling and better parallelization,NA
+R_247SqmKSrZNxkwE,I have never used tidymodels,Q5_4,50,"Model monitoring, updating, & organization",NA
+R_247SqmKSrZNxkwE,I have never used tidymodels,Q5_5,0,Translate prediction equations,NA
+R_247SqmKSrZNxkwE,I have never used tidymodels,Q5_6,0,Model stacking ,NA
+R_247SqmKSrZNxkwE,I have never used tidymodels,Q5_8,0,Post-processing in workflow(),NA
+R_247SqmKSrZNxkwE,I have never used tidymodels,Q5_9,0,Ignore recipe steps,NA
+R_247SqmKSrZNxkwE,I have never used tidymodels,Q5_10,0,H2O.ai support ,NA
+R_247SqmKSrZNxkwE,I have never used tidymodels,Q5_12,0,Other,NA
+R_3NVVdGShKH4m1ea,I have used tidymodels packages a few times,Q5_1,15,Survival analysis,NA
+R_3NVVdGShKH4m1ea,I have used tidymodels packages a few times,Q5_2,10,Support for sparse data structures,NA
+R_3NVVdGShKH4m1ea,I have used tidymodels packages a few times,Q5_3,5,Adaptive resampling and better parallelization,NA
+R_3NVVdGShKH4m1ea,I have used tidymodels packages a few times,Q5_4,15,"Model monitoring, updating, & organization",NA
+R_3NVVdGShKH4m1ea,I have used tidymodels packages a few times,Q5_5,5,Translate prediction equations,NA
+R_3NVVdGShKH4m1ea,I have used tidymodels packages a few times,Q5_6,25,Model stacking ,NA
+R_3NVVdGShKH4m1ea,I have used tidymodels packages a few times,Q5_8,5,Post-processing in workflow(),NA
+R_3NVVdGShKH4m1ea,I have used tidymodels packages a few times,Q5_9,15,Ignore recipe steps,NA
+R_3NVVdGShKH4m1ea,I have used tidymodels packages a few times,Q5_10,5,H2O.ai support ,NA
+R_3NVVdGShKH4m1ea,I have used tidymodels packages a few times,Q5_12,0,Other,NA
+R_217HMFF0W07yaFE,I have used tidymodels packages a few times,Q5_1,0,Survival analysis,NA
+R_217HMFF0W07yaFE,I have used tidymodels packages a few times,Q5_2,0,Support for sparse data structures,NA
+R_217HMFF0W07yaFE,I have used tidymodels packages a few times,Q5_3,25,Adaptive resampling and better parallelization,NA
+R_217HMFF0W07yaFE,I have used tidymodels packages a few times,Q5_4,25,"Model monitoring, updating, & organization",NA
+R_217HMFF0W07yaFE,I have used tidymodels packages a few times,Q5_5,0,Translate prediction equations,NA
+R_217HMFF0W07yaFE,I have used tidymodels packages a few times,Q5_6,50,Model stacking ,NA
+R_217HMFF0W07yaFE,I have used tidymodels packages a few times,Q5_8,0,Post-processing in workflow(),NA
+R_217HMFF0W07yaFE,I have used tidymodels packages a few times,Q5_9,0,Ignore recipe steps,NA
+R_217HMFF0W07yaFE,I have used tidymodels packages a few times,Q5_10,0,H2O.ai support ,NA
+R_217HMFF0W07yaFE,I have used tidymodels packages a few times,Q5_12,0,Other,NA
+R_3fvorjaIZqO2sF3,I have contributed to tidymodels packages or taught others how to use them,Q5_1,20,Survival analysis,NA
+R_3fvorjaIZqO2sF3,I have contributed to tidymodels packages or taught others how to use them,Q5_2,0,Support for sparse data structures,NA
+R_3fvorjaIZqO2sF3,I have contributed to tidymodels packages or taught others how to use them,Q5_3,0,Adaptive resampling and better parallelization,NA
+R_3fvorjaIZqO2sF3,I have contributed to tidymodels packages or taught others how to use them,Q5_4,0,"Model monitoring, updating, & organization",NA
+R_3fvorjaIZqO2sF3,I have contributed to tidymodels packages or taught others how to use them,Q5_5,0,Translate prediction equations,NA
+R_3fvorjaIZqO2sF3,I have contributed to tidymodels packages or taught others how to use them,Q5_6,30,Model stacking ,NA
+R_3fvorjaIZqO2sF3,I have contributed to tidymodels packages or taught others how to use them,Q5_8,30,Post-processing in workflow(),NA
+R_3fvorjaIZqO2sF3,I have contributed to tidymodels packages or taught others how to use them,Q5_9,20,Ignore recipe steps,NA
+R_3fvorjaIZqO2sF3,I have contributed to tidymodels packages or taught others how to use them,Q5_10,0,H2O.ai support ,NA
+R_3fvorjaIZqO2sF3,I have contributed to tidymodels packages or taught others how to use them,Q5_12,0,Other,NA
+R_3QK1eCDXWoikihv,I have used tidymodels packages many times,Q5_1,0,Survival analysis,NA
+R_3QK1eCDXWoikihv,I have used tidymodels packages many times,Q5_2,0,Support for sparse data structures,NA
+R_3QK1eCDXWoikihv,I have used tidymodels packages many times,Q5_3,0,Adaptive resampling and better parallelization,NA
+R_3QK1eCDXWoikihv,I have used tidymodels packages many times,Q5_4,40,"Model monitoring, updating, & organization",NA
+R_3QK1eCDXWoikihv,I have used tidymodels packages many times,Q5_5,30,Translate prediction equations,NA
+R_3QK1eCDXWoikihv,I have used tidymodels packages many times,Q5_6,10,Model stacking ,NA
+R_3QK1eCDXWoikihv,I have used tidymodels packages many times,Q5_8,20,Post-processing in workflow(),NA
+R_3QK1eCDXWoikihv,I have used tidymodels packages many times,Q5_9,0,Ignore recipe steps,NA
+R_3QK1eCDXWoikihv,I have used tidymodels packages many times,Q5_10,0,H2O.ai support ,NA
+R_3QK1eCDXWoikihv,I have used tidymodels packages many times,Q5_12,0,Other,NA
+R_3spL9PaTQjUhc2N,I have used tidymodels packages many times,Q5_1,0,Survival analysis,NA
+R_3spL9PaTQjUhc2N,I have used tidymodels packages many times,Q5_2,0,Support for sparse data structures,NA
+R_3spL9PaTQjUhc2N,I have used tidymodels packages many times,Q5_3,0,Adaptive resampling and better parallelization,NA
+R_3spL9PaTQjUhc2N,I have used tidymodels packages many times,Q5_4,0,"Model monitoring, updating, & organization",NA
+R_3spL9PaTQjUhc2N,I have used tidymodels packages many times,Q5_5,0,Translate prediction equations,NA
+R_3spL9PaTQjUhc2N,I have used tidymodels packages many times,Q5_6,0,Model stacking ,NA
+R_3spL9PaTQjUhc2N,I have used tidymodels packages many times,Q5_8,0,Post-processing in workflow(),NA
+R_3spL9PaTQjUhc2N,I have used tidymodels packages many times,Q5_9,0,Ignore recipe steps,NA
+R_3spL9PaTQjUhc2N,I have used tidymodels packages many times,Q5_10,0,H2O.ai support ,NA
+R_3spL9PaTQjUhc2N,I have used tidymodels packages many times,Q5_12,100,Other,Model interpretability
+R_1Ka2p908ZTzWqb2,I have used tidymodels packages many times,Q5_1,0,Survival analysis,NA
+R_1Ka2p908ZTzWqb2,I have used tidymodels packages many times,Q5_2,0,Support for sparse data structures,NA
+R_1Ka2p908ZTzWqb2,I have used tidymodels packages many times,Q5_3,20,Adaptive resampling and better parallelization,NA
+R_1Ka2p908ZTzWqb2,I have used tidymodels packages many times,Q5_4,50,"Model monitoring, updating, & organization",NA
+R_1Ka2p908ZTzWqb2,I have used tidymodels packages many times,Q5_5,20,Translate prediction equations,NA
+R_1Ka2p908ZTzWqb2,I have used tidymodels packages many times,Q5_6,10,Model stacking ,NA
+R_1Ka2p908ZTzWqb2,I have used tidymodels packages many times,Q5_8,0,Post-processing in workflow(),NA
+R_1Ka2p908ZTzWqb2,I have used tidymodels packages many times,Q5_9,0,Ignore recipe steps,NA
+R_1Ka2p908ZTzWqb2,I have used tidymodels packages many times,Q5_10,0,H2O.ai support ,NA
+R_1Ka2p908ZTzWqb2,I have used tidymodels packages many times,Q5_12,0,Other,NA
+R_1re49YU3DZwxKMK,I have used tidymodels packages many times,Q5_1,0,Survival analysis,NA
+R_1re49YU3DZwxKMK,I have used tidymodels packages many times,Q5_2,20,Support for sparse data structures,NA
+R_1re49YU3DZwxKMK,I have used tidymodels packages many times,Q5_3,20,Adaptive resampling and better parallelization,NA
+R_1re49YU3DZwxKMK,I have used tidymodels packages many times,Q5_4,20,"Model monitoring, updating, & organization",NA
+R_1re49YU3DZwxKMK,I have used tidymodels packages many times,Q5_5,0,Translate prediction equations,NA
+R_1re49YU3DZwxKMK,I have used tidymodels packages many times,Q5_6,0,Model stacking ,NA
+R_1re49YU3DZwxKMK,I have used tidymodels packages many times,Q5_8,20,Post-processing in workflow(),NA
+R_1re49YU3DZwxKMK,I have used tidymodels packages many times,Q5_9,20,Ignore recipe steps,NA
+R_1re49YU3DZwxKMK,I have used tidymodels packages many times,Q5_10,0,H2O.ai support ,NA
+R_1re49YU3DZwxKMK,I have used tidymodels packages many times,Q5_12,0,Other,NA
+R_3HMsG0X8STILt8B,I have used tidymodels packages a few times,Q5_1,0,Survival analysis,NA
+R_3HMsG0X8STILt8B,I have used tidymodels packages a few times,Q5_2,100,Support for sparse data structures,NA
+R_3HMsG0X8STILt8B,I have used tidymodels packages a few times,Q5_3,0,Adaptive resampling and better parallelization,NA
+R_3HMsG0X8STILt8B,I have used tidymodels packages a few times,Q5_4,0,"Model monitoring, updating, & organization",NA
+R_3HMsG0X8STILt8B,I have used tidymodels packages a few times,Q5_5,0,Translate prediction equations,NA
+R_3HMsG0X8STILt8B,I have used tidymodels packages a few times,Q5_6,0,Model stacking ,NA
+R_3HMsG0X8STILt8B,I have used tidymodels packages a few times,Q5_8,0,Post-processing in workflow(),NA
+R_3HMsG0X8STILt8B,I have used tidymodels packages a few times,Q5_9,0,Ignore recipe steps,NA
+R_3HMsG0X8STILt8B,I have used tidymodels packages a few times,Q5_10,0,H2O.ai support ,NA
+R_3HMsG0X8STILt8B,I have used tidymodels packages a few times,Q5_12,0,Other,NA
+R_QgALt7SPvTaMIpP,I have used tidymodels packages many times,Q5_1,0,Survival analysis,NA
+R_QgALt7SPvTaMIpP,I have used tidymodels packages many times,Q5_2,0,Support for sparse data structures,NA
+R_QgALt7SPvTaMIpP,I have used tidymodels packages many times,Q5_3,0,Adaptive resampling and better parallelization,NA
+R_QgALt7SPvTaMIpP,I have used tidymodels packages many times,Q5_4,50,"Model monitoring, updating, & organization",NA
+R_QgALt7SPvTaMIpP,I have used tidymodels packages many times,Q5_5,0,Translate prediction equations,NA
+R_QgALt7SPvTaMIpP,I have used tidymodels packages many times,Q5_6,50,Model stacking ,NA
+R_QgALt7SPvTaMIpP,I have used tidymodels packages many times,Q5_8,0,Post-processing in workflow(),NA
+R_QgALt7SPvTaMIpP,I have used tidymodels packages many times,Q5_9,0,Ignore recipe steps,NA
+R_QgALt7SPvTaMIpP,I have used tidymodels packages many times,Q5_10,0,H2O.ai support ,NA
+R_QgALt7SPvTaMIpP,I have used tidymodels packages many times,Q5_12,0,Other,NA
+R_1CJCPY2i8wdc8uF,I have used tidymodels packages a few times,Q5_1,30,Survival analysis,NA
+R_1CJCPY2i8wdc8uF,I have used tidymodels packages a few times,Q5_2,0,Support for sparse data structures,NA
+R_1CJCPY2i8wdc8uF,I have used tidymodels packages a few times,Q5_3,10,Adaptive resampling and better parallelization,NA
+R_1CJCPY2i8wdc8uF,I have used tidymodels packages a few times,Q5_4,10,"Model monitoring, updating, & organization",NA
+R_1CJCPY2i8wdc8uF,I have used tidymodels packages a few times,Q5_5,10,Translate prediction equations,NA
+R_1CJCPY2i8wdc8uF,I have used tidymodels packages a few times,Q5_6,10,Model stacking ,NA
+R_1CJCPY2i8wdc8uF,I have used tidymodels packages a few times,Q5_8,20,Post-processing in workflow(),NA
+R_1CJCPY2i8wdc8uF,I have used tidymodels packages a few times,Q5_9,10,Ignore recipe steps,NA
+R_1CJCPY2i8wdc8uF,I have used tidymodels packages a few times,Q5_10,0,H2O.ai support ,NA
+R_1CJCPY2i8wdc8uF,I have used tidymodels packages a few times,Q5_12,0,Other,NA
+R_79bmOo6pcG2RvKp,I have never used tidymodels,Q5_1,0,Survival analysis,NA
+R_79bmOo6pcG2RvKp,I have never used tidymodels,Q5_2,25,Support for sparse data structures,NA
+R_79bmOo6pcG2RvKp,I have never used tidymodels,Q5_3,25,Adaptive resampling and better parallelization,NA
+R_79bmOo6pcG2RvKp,I have never used tidymodels,Q5_4,0,"Model monitoring, updating, & organization",NA
+R_79bmOo6pcG2RvKp,I have never used tidymodels,Q5_5,25,Translate prediction equations,NA
+R_79bmOo6pcG2RvKp,I have never used tidymodels,Q5_6,25,Model stacking ,NA
+R_79bmOo6pcG2RvKp,I have never used tidymodels,Q5_8,0,Post-processing in workflow(),NA
+R_79bmOo6pcG2RvKp,I have never used tidymodels,Q5_9,0,Ignore recipe steps,NA
+R_79bmOo6pcG2RvKp,I have never used tidymodels,Q5_10,0,H2O.ai support ,NA
+R_79bmOo6pcG2RvKp,I have never used tidymodels,Q5_12,0,Other,NA
+R_3qlllxxyLXmTKd7,I have used tidymodels packages a few times,Q5_1,20,Survival analysis,NA
+R_3qlllxxyLXmTKd7,I have used tidymodels packages a few times,Q5_2,0,Support for sparse data structures,NA
+R_3qlllxxyLXmTKd7,I have used tidymodels packages a few times,Q5_3,0,Adaptive resampling and better parallelization,NA
+R_3qlllxxyLXmTKd7,I have used tidymodels packages a few times,Q5_4,0,"Model monitoring, updating, & organization",NA
+R_3qlllxxyLXmTKd7,I have used tidymodels packages a few times,Q5_5,0,Translate prediction equations,NA
+R_3qlllxxyLXmTKd7,I have used tidymodels packages a few times,Q5_6,0,Model stacking ,NA
+R_3qlllxxyLXmTKd7,I have used tidymodels packages a few times,Q5_8,0,Post-processing in workflow(),NA
+R_3qlllxxyLXmTKd7,I have used tidymodels packages a few times,Q5_9,10,Ignore recipe steps,NA
+R_3qlllxxyLXmTKd7,I have used tidymodels packages a few times,Q5_10,70,H2O.ai support ,NA
+R_3qlllxxyLXmTKd7,I have used tidymodels packages a few times,Q5_12,0,Other,NA
+R_vIE4y29GzP0Rqud,I have used tidymodels packages a few times,Q5_1,20,Survival analysis,NA
+R_vIE4y29GzP0Rqud,I have used tidymodels packages a few times,Q5_2,0,Support for sparse data structures,NA
+R_vIE4y29GzP0Rqud,I have used tidymodels packages a few times,Q5_3,20,Adaptive resampling and better parallelization,NA
+R_vIE4y29GzP0Rqud,I have used tidymodels packages a few times,Q5_4,20,"Model monitoring, updating, & organization",NA
+R_vIE4y29GzP0Rqud,I have used tidymodels packages a few times,Q5_5,0,Translate prediction equations,NA
+R_vIE4y29GzP0Rqud,I have used tidymodels packages a few times,Q5_6,20,Model stacking ,NA
+R_vIE4y29GzP0Rqud,I have used tidymodels packages a few times,Q5_8,20,Post-processing in workflow(),NA
+R_vIE4y29GzP0Rqud,I have used tidymodels packages a few times,Q5_9,0,Ignore recipe steps,NA
+R_vIE4y29GzP0Rqud,I have used tidymodels packages a few times,Q5_10,0,H2O.ai support ,NA
+R_vIE4y29GzP0Rqud,I have used tidymodels packages a few times,Q5_12,0,Other,NA
+R_VU0zUmVIL1o5Bst,I have never used tidymodels,Q5_1,0,Survival analysis,NA
+R_VU0zUmVIL1o5Bst,I have never used tidymodels,Q5_2,0,Support for sparse data structures,NA
+R_VU0zUmVIL1o5Bst,I have never used tidymodels,Q5_3,0,Adaptive resampling and better parallelization,NA
+R_VU0zUmVIL1o5Bst,I have never used tidymodels,Q5_4,0,"Model monitoring, updating, & organization",NA
+R_VU0zUmVIL1o5Bst,I have never used tidymodels,Q5_5,0,Translate prediction equations,NA
+R_VU0zUmVIL1o5Bst,I have never used tidymodels,Q5_6,100,Model stacking ,NA
+R_VU0zUmVIL1o5Bst,I have never used tidymodels,Q5_8,0,Post-processing in workflow(),NA
+R_VU0zUmVIL1o5Bst,I have never used tidymodels,Q5_9,0,Ignore recipe steps,NA
+R_VU0zUmVIL1o5Bst,I have never used tidymodels,Q5_10,0,H2O.ai support ,NA
+R_VU0zUmVIL1o5Bst,I have never used tidymodels,Q5_12,0,Other,NA
+R_3mjGtv6dtTipNJz,I have used tidymodels packages a few times,Q5_1,0,Survival analysis,NA
+R_3mjGtv6dtTipNJz,I have used tidymodels packages a few times,Q5_2,0,Support for sparse data structures,NA
+R_3mjGtv6dtTipNJz,I have used tidymodels packages a few times,Q5_3,40,Adaptive resampling and better parallelization,NA
+R_3mjGtv6dtTipNJz,I have used tidymodels packages a few times,Q5_4,0,"Model monitoring, updating, & organization",NA
+R_3mjGtv6dtTipNJz,I have used tidymodels packages a few times,Q5_5,30,Translate prediction equations,NA
+R_3mjGtv6dtTipNJz,I have used tidymodels packages a few times,Q5_6,30,Model stacking ,NA
+R_3mjGtv6dtTipNJz,I have used tidymodels packages a few times,Q5_8,0,Post-processing in workflow(),NA
+R_3mjGtv6dtTipNJz,I have used tidymodels packages a few times,Q5_9,0,Ignore recipe steps,NA
+R_3mjGtv6dtTipNJz,I have used tidymodels packages a few times,Q5_10,0,H2O.ai support ,NA
+R_3mjGtv6dtTipNJz,I have used tidymodels packages a few times,Q5_12,0,Other,NA
+R_1OYPwFo70Axwy0r,I have used tidymodels packages a few times,Q5_1,0,Survival analysis,NA
+R_1OYPwFo70Axwy0r,I have used tidymodels packages a few times,Q5_2,0,Support for sparse data structures,NA
+R_1OYPwFo70Axwy0r,I have used tidymodels packages a few times,Q5_3,10,Adaptive resampling and better parallelization,NA
+R_1OYPwFo70Axwy0r,I have used tidymodels packages a few times,Q5_4,0,"Model monitoring, updating, & organization",NA
+R_1OYPwFo70Axwy0r,I have used tidymodels packages a few times,Q5_5,0,Translate prediction equations,NA
+R_1OYPwFo70Axwy0r,I have used tidymodels packages a few times,Q5_6,30,Model stacking ,NA
+R_1OYPwFo70Axwy0r,I have used tidymodels packages a few times,Q5_8,0,Post-processing in workflow(),NA
+R_1OYPwFo70Axwy0r,I have used tidymodels packages a few times,Q5_9,10,Ignore recipe steps,NA
+R_1OYPwFo70Axwy0r,I have used tidymodels packages a few times,Q5_10,0,H2O.ai support ,NA
+R_1OYPwFo70Axwy0r,I have used tidymodels packages a few times,Q5_12,50,Other,Variable importance
+R_3hGc1Od6XrYp6bc,I have used tidymodels packages a few times,Q5_1,0,Survival analysis,NA
+R_3hGc1Od6XrYp6bc,I have used tidymodels packages a few times,Q5_2,0,Support for sparse data structures,NA
+R_3hGc1Od6XrYp6bc,I have used tidymodels packages a few times,Q5_3,20,Adaptive resampling and better parallelization,NA
+R_3hGc1Od6XrYp6bc,I have used tidymodels packages a few times,Q5_4,20,"Model monitoring, updating, & organization",NA
+R_3hGc1Od6XrYp6bc,I have used tidymodels packages a few times,Q5_5,20,Translate prediction equations,NA
+R_3hGc1Od6XrYp6bc,I have used tidymodels packages a few times,Q5_6,40,Model stacking ,NA
+R_3hGc1Od6XrYp6bc,I have used tidymodels packages a few times,Q5_8,0,Post-processing in workflow(),NA
+R_3hGc1Od6XrYp6bc,I have used tidymodels packages a few times,Q5_9,0,Ignore recipe steps,NA
+R_3hGc1Od6XrYp6bc,I have used tidymodels packages a few times,Q5_10,0,H2O.ai support ,NA
+R_3hGc1Od6XrYp6bc,I have used tidymodels packages a few times,Q5_12,0,Other,NA
+R_enx3uDXlVbeufIZ,I have used tidymodels packages a few times,Q5_1,100,Survival analysis,NA
+R_enx3uDXlVbeufIZ,I have used tidymodels packages a few times,Q5_2,0,Support for sparse data structures,NA
+R_enx3uDXlVbeufIZ,I have used tidymodels packages a few times,Q5_3,0,Adaptive resampling and better parallelization,NA
+R_enx3uDXlVbeufIZ,I have used tidymodels packages a few times,Q5_4,0,"Model monitoring, updating, & organization",NA
+R_enx3uDXlVbeufIZ,I have used tidymodels packages a few times,Q5_5,0,Translate prediction equations,NA
+R_enx3uDXlVbeufIZ,I have used tidymodels packages a few times,Q5_6,0,Model stacking ,NA
+R_enx3uDXlVbeufIZ,I have used tidymodels packages a few times,Q5_8,0,Post-processing in workflow(),NA
+R_enx3uDXlVbeufIZ,I have used tidymodels packages a few times,Q5_9,0,Ignore recipe steps,NA
+R_enx3uDXlVbeufIZ,I have used tidymodels packages a few times,Q5_10,0,H2O.ai support ,NA
+R_enx3uDXlVbeufIZ,I have used tidymodels packages a few times,Q5_12,0,Other,NA
+R_1E3ZYUQQeBr9Yli,I have used tidymodels packages a few times,Q5_1,30,Survival analysis,NA
+R_1E3ZYUQQeBr9Yli,I have used tidymodels packages a few times,Q5_2,10,Support for sparse data structures,NA
+R_1E3ZYUQQeBr9Yli,I have used tidymodels packages a few times,Q5_3,10,Adaptive resampling and better parallelization,NA
+R_1E3ZYUQQeBr9Yli,I have used tidymodels packages a few times,Q5_4,10,"Model monitoring, updating, & organization",NA
+R_1E3ZYUQQeBr9Yli,I have used tidymodels packages a few times,Q5_5,0,Translate prediction equations,NA
+R_1E3ZYUQQeBr9Yli,I have used tidymodels packages a few times,Q5_6,30,Model stacking ,NA
+R_1E3ZYUQQeBr9Yli,I have used tidymodels packages a few times,Q5_8,10,Post-processing in workflow(),NA
+R_1E3ZYUQQeBr9Yli,I have used tidymodels packages a few times,Q5_9,0,Ignore recipe steps,NA
+R_1E3ZYUQQeBr9Yli,I have used tidymodels packages a few times,Q5_10,0,H2O.ai support ,NA
+R_1E3ZYUQQeBr9Yli,I have used tidymodels packages a few times,Q5_12,0,Other,NA
+R_1E3TQpCnx8owUJw,I have used tidymodels packages a few times,Q5_1,0,Survival analysis,NA
+R_1E3TQpCnx8owUJw,I have used tidymodels packages a few times,Q5_2,0,Support for sparse data structures,NA
+R_1E3TQpCnx8owUJw,I have used tidymodels packages a few times,Q5_3,0,Adaptive resampling and better parallelization,NA
+R_1E3TQpCnx8owUJw,I have used tidymodels packages a few times,Q5_4,0,"Model monitoring, updating, & organization",NA
+R_1E3TQpCnx8owUJw,I have used tidymodels packages a few times,Q5_5,100,Translate prediction equations,NA
+R_1E3TQpCnx8owUJw,I have used tidymodels packages a few times,Q5_6,0,Model stacking ,NA
+R_1E3TQpCnx8owUJw,I have used tidymodels packages a few times,Q5_8,0,Post-processing in workflow(),NA
+R_1E3TQpCnx8owUJw,I have used tidymodels packages a few times,Q5_9,0,Ignore recipe steps,NA
+R_1E3TQpCnx8owUJw,I have used tidymodels packages a few times,Q5_10,0,H2O.ai support ,NA
+R_1E3TQpCnx8owUJw,I have used tidymodels packages a few times,Q5_12,0,Other,NA
+R_3EgrGpeBMq7swLy,I have used tidymodels packages many times,Q5_1,30,Survival analysis,NA
+R_3EgrGpeBMq7swLy,I have used tidymodels packages many times,Q5_2,0,Support for sparse data structures,NA
+R_3EgrGpeBMq7swLy,I have used tidymodels packages many times,Q5_3,0,Adaptive resampling and better parallelization,NA
+R_3EgrGpeBMq7swLy,I have used tidymodels packages many times,Q5_4,0,"Model monitoring, updating, & organization",NA
+R_3EgrGpeBMq7swLy,I have used tidymodels packages many times,Q5_5,50,Translate prediction equations,NA
+R_3EgrGpeBMq7swLy,I have used tidymodels packages many times,Q5_6,0,Model stacking ,NA
+R_3EgrGpeBMq7swLy,I have used tidymodels packages many times,Q5_8,0,Post-processing in workflow(),NA
+R_3EgrGpeBMq7swLy,I have used tidymodels packages many times,Q5_9,0,Ignore recipe steps,NA
+R_3EgrGpeBMq7swLy,I have used tidymodels packages many times,Q5_10,20,H2O.ai support ,NA
+R_3EgrGpeBMq7swLy,I have used tidymodels packages many times,Q5_12,0,Other,NA
+R_2WT206UyBgjIzaL,I have used tidymodels packages a few times,Q5_1,0,Survival analysis,NA
+R_2WT206UyBgjIzaL,I have used tidymodels packages a few times,Q5_2,0,Support for sparse data structures,NA
+R_2WT206UyBgjIzaL,I have used tidymodels packages a few times,Q5_3,0,Adaptive resampling and better parallelization,NA
+R_2WT206UyBgjIzaL,I have used tidymodels packages a few times,Q5_4,10,"Model monitoring, updating, & organization",NA
+R_2WT206UyBgjIzaL,I have used tidymodels packages a few times,Q5_5,70,Translate prediction equations,NA
+R_2WT206UyBgjIzaL,I have used tidymodels packages a few times,Q5_6,20,Model stacking ,NA
+R_2WT206UyBgjIzaL,I have used tidymodels packages a few times,Q5_8,0,Post-processing in workflow(),NA
+R_2WT206UyBgjIzaL,I have used tidymodels packages a few times,Q5_9,0,Ignore recipe steps,NA
+R_2WT206UyBgjIzaL,I have used tidymodels packages a few times,Q5_10,0,H2O.ai support ,NA
+R_2WT206UyBgjIzaL,I have used tidymodels packages a few times,Q5_12,0,Other,NA
+R_1BXUtSCM8Mx27Pb,I have used tidymodels packages a few times,Q5_1,20,Survival analysis,NA
+R_1BXUtSCM8Mx27Pb,I have used tidymodels packages a few times,Q5_2,0,Support for sparse data structures,NA
+R_1BXUtSCM8Mx27Pb,I have used tidymodels packages a few times,Q5_3,20,Adaptive resampling and better parallelization,NA
+R_1BXUtSCM8Mx27Pb,I have used tidymodels packages a few times,Q5_4,0,"Model monitoring, updating, & organization",NA
+R_1BXUtSCM8Mx27Pb,I have used tidymodels packages a few times,Q5_5,20,Translate prediction equations,NA
+R_1BXUtSCM8Mx27Pb,I have used tidymodels packages a few times,Q5_6,20,Model stacking ,NA
+R_1BXUtSCM8Mx27Pb,I have used tidymodels packages a few times,Q5_8,0,Post-processing in workflow(),NA
+R_1BXUtSCM8Mx27Pb,I have used tidymodels packages a few times,Q5_9,0,Ignore recipe steps,NA
+R_1BXUtSCM8Mx27Pb,I have used tidymodels packages a few times,Q5_10,20,H2O.ai support ,NA
+R_1BXUtSCM8Mx27Pb,I have used tidymodels packages a few times,Q5_12,0,Other,NA
+R_1mUjdqf9oPlE4xq,I have used tidymodels packages a few times,Q5_1,25,Survival analysis,NA
+R_1mUjdqf9oPlE4xq,I have used tidymodels packages a few times,Q5_2,0,Support for sparse data structures,NA
+R_1mUjdqf9oPlE4xq,I have used tidymodels packages a few times,Q5_3,0,Adaptive resampling and better parallelization,NA
+R_1mUjdqf9oPlE4xq,I have used tidymodels packages a few times,Q5_4,25,"Model monitoring, updating, & organization",NA
+R_1mUjdqf9oPlE4xq,I have used tidymodels packages a few times,Q5_5,0,Translate prediction equations,NA
+R_1mUjdqf9oPlE4xq,I have used tidymodels packages a few times,Q5_6,25,Model stacking ,NA
+R_1mUjdqf9oPlE4xq,I have used tidymodels packages a few times,Q5_8,0,Post-processing in workflow(),NA
+R_1mUjdqf9oPlE4xq,I have used tidymodels packages a few times,Q5_9,0,Ignore recipe steps,NA
+R_1mUjdqf9oPlE4xq,I have used tidymodels packages a few times,Q5_10,25,H2O.ai support ,NA
+R_1mUjdqf9oPlE4xq,I have used tidymodels packages a few times,Q5_12,0,Other,NA
+R_2PBbJ6u5EnMsoIZ,I have used tidymodels packages a few times,Q5_1,0,Survival analysis,NA
+R_2PBbJ6u5EnMsoIZ,I have used tidymodels packages a few times,Q5_2,0,Support for sparse data structures,NA
+R_2PBbJ6u5EnMsoIZ,I have used tidymodels packages a few times,Q5_3,0,Adaptive resampling and better parallelization,NA
+R_2PBbJ6u5EnMsoIZ,I have used tidymodels packages a few times,Q5_4,50,"Model monitoring, updating, & organization",NA
+R_2PBbJ6u5EnMsoIZ,I have used tidymodels packages a few times,Q5_5,0,Translate prediction equations,NA
+R_2PBbJ6u5EnMsoIZ,I have used tidymodels packages a few times,Q5_6,0,Model stacking ,NA
+R_2PBbJ6u5EnMsoIZ,I have used tidymodels packages a few times,Q5_8,50,Post-processing in workflow(),NA
+R_2PBbJ6u5EnMsoIZ,I have used tidymodels packages a few times,Q5_9,0,Ignore recipe steps,NA
+R_2PBbJ6u5EnMsoIZ,I have used tidymodels packages a few times,Q5_10,0,H2O.ai support ,NA
+R_2PBbJ6u5EnMsoIZ,I have used tidymodels packages a few times,Q5_12,0,Other,NA
+R_20VumXKAU3Ux4BW,I have used tidymodels packages a few times,Q5_1,10,Survival analysis,NA
+R_20VumXKAU3Ux4BW,I have used tidymodels packages a few times,Q5_2,10,Support for sparse data structures,NA
+R_20VumXKAU3Ux4BW,I have used tidymodels packages a few times,Q5_3,10,Adaptive resampling and better parallelization,NA
+R_20VumXKAU3Ux4BW,I have used tidymodels packages a few times,Q5_4,20,"Model monitoring, updating, & organization",NA
+R_20VumXKAU3Ux4BW,I have used tidymodels packages a few times,Q5_5,5,Translate prediction equations,NA
+R_20VumXKAU3Ux4BW,I have used tidymodels packages a few times,Q5_6,10,Model stacking ,NA
+R_20VumXKAU3Ux4BW,I have used tidymodels packages a few times,Q5_8,25,Post-processing in workflow(),NA
+R_20VumXKAU3Ux4BW,I have used tidymodels packages a few times,Q5_9,10,Ignore recipe steps,NA
+R_20VumXKAU3Ux4BW,I have used tidymodels packages a few times,Q5_10,0,H2O.ai support ,NA
+R_20VumXKAU3Ux4BW,I have used tidymodels packages a few times,Q5_12,0,Other,NA
+R_2YFlQQXShICohZf,I have used tidymodels packages many times,Q5_1,0,Survival analysis,NA
+R_2YFlQQXShICohZf,I have used tidymodels packages many times,Q5_2,0,Support for sparse data structures,NA
+R_2YFlQQXShICohZf,I have used tidymodels packages many times,Q5_3,0,Adaptive resampling and better parallelization,NA
+R_2YFlQQXShICohZf,I have used tidymodels packages many times,Q5_4,10,"Model monitoring, updating, & organization",NA
+R_2YFlQQXShICohZf,I have used tidymodels packages many times,Q5_5,0,Translate prediction equations,NA
+R_2YFlQQXShICohZf,I have used tidymodels packages many times,Q5_6,30,Model stacking ,NA
+R_2YFlQQXShICohZf,I have used tidymodels packages many times,Q5_8,20,Post-processing in workflow(),NA
+R_2YFlQQXShICohZf,I have used tidymodels packages many times,Q5_9,40,Ignore recipe steps,NA
+R_2YFlQQXShICohZf,I have used tidymodels packages many times,Q5_10,0,H2O.ai support ,NA
+R_2YFlQQXShICohZf,I have used tidymodels packages many times,Q5_12,0,Other,NA
+R_1dM2O5ZfMKZ9Qiu,I have used tidymodels packages a few times,Q5_1,0,Survival analysis,NA
+R_1dM2O5ZfMKZ9Qiu,I have used tidymodels packages a few times,Q5_2,0,Support for sparse data structures,NA
+R_1dM2O5ZfMKZ9Qiu,I have used tidymodels packages a few times,Q5_3,0,Adaptive resampling and better parallelization,NA
+R_1dM2O5ZfMKZ9Qiu,I have used tidymodels packages a few times,Q5_4,0,"Model monitoring, updating, & organization",NA
+R_1dM2O5ZfMKZ9Qiu,I have used tidymodels packages a few times,Q5_5,0,Translate prediction equations,NA
+R_1dM2O5ZfMKZ9Qiu,I have used tidymodels packages a few times,Q5_6,100,Model stacking ,NA
+R_1dM2O5ZfMKZ9Qiu,I have used tidymodels packages a few times,Q5_8,0,Post-processing in workflow(),NA
+R_1dM2O5ZfMKZ9Qiu,I have used tidymodels packages a few times,Q5_9,0,Ignore recipe steps,NA
+R_1dM2O5ZfMKZ9Qiu,I have used tidymodels packages a few times,Q5_10,0,H2O.ai support ,NA
+R_1dM2O5ZfMKZ9Qiu,I have used tidymodels packages a few times,Q5_12,0,Other,NA
+R_DpnNcKHB9DuVMvT,I have used tidymodels packages a few times,Q5_1,40,Survival analysis,NA
+R_DpnNcKHB9DuVMvT,I have used tidymodels packages a few times,Q5_2,0,Support for sparse data structures,NA
+R_DpnNcKHB9DuVMvT,I have used tidymodels packages a few times,Q5_3,20,Adaptive resampling and better parallelization,NA
+R_DpnNcKHB9DuVMvT,I have used tidymodels packages a few times,Q5_4,20,"Model monitoring, updating, & organization",NA
+R_DpnNcKHB9DuVMvT,I have used tidymodels packages a few times,Q5_5,0,Translate prediction equations,NA
+R_DpnNcKHB9DuVMvT,I have used tidymodels packages a few times,Q5_6,0,Model stacking ,NA
+R_DpnNcKHB9DuVMvT,I have used tidymodels packages a few times,Q5_8,20,Post-processing in workflow(),NA
+R_DpnNcKHB9DuVMvT,I have used tidymodels packages a few times,Q5_9,0,Ignore recipe steps,NA
+R_DpnNcKHB9DuVMvT,I have used tidymodels packages a few times,Q5_10,0,H2O.ai support ,NA
+R_DpnNcKHB9DuVMvT,I have used tidymodels packages a few times,Q5_12,0,Other,NA
+R_23VJU9xGTTf5m8u,I have used tidymodels packages a few times,Q5_1,0,Survival analysis,NA
+R_23VJU9xGTTf5m8u,I have used tidymodels packages a few times,Q5_2,5,Support for sparse data structures,NA
+R_23VJU9xGTTf5m8u,I have used tidymodels packages a few times,Q5_3,30,Adaptive resampling and better parallelization,NA
+R_23VJU9xGTTf5m8u,I have used tidymodels packages a few times,Q5_4,25,"Model monitoring, updating, & organization",NA
+R_23VJU9xGTTf5m8u,I have used tidymodels packages a few times,Q5_5,0,Translate prediction equations,NA
+R_23VJU9xGTTf5m8u,I have used tidymodels packages a few times,Q5_6,25,Model stacking ,NA
+R_23VJU9xGTTf5m8u,I have used tidymodels packages a few times,Q5_8,15,Post-processing in workflow(),NA
+R_23VJU9xGTTf5m8u,I have used tidymodels packages a few times,Q5_9,0,Ignore recipe steps,NA
+R_23VJU9xGTTf5m8u,I have used tidymodels packages a few times,Q5_10,0,H2O.ai support ,NA
+R_23VJU9xGTTf5m8u,I have used tidymodels packages a few times,Q5_12,0,Other,NA
+R_3CHIGF0iBaPs8Gn,I have used tidymodels packages a few times,Q5_1,20,Survival analysis,NA
+R_3CHIGF0iBaPs8Gn,I have used tidymodels packages a few times,Q5_2,20,Support for sparse data structures,NA
+R_3CHIGF0iBaPs8Gn,I have used tidymodels packages a few times,Q5_3,50,Adaptive resampling and better parallelization,NA
+R_3CHIGF0iBaPs8Gn,I have used tidymodels packages a few times,Q5_4,0,"Model monitoring, updating, & organization",NA
+R_3CHIGF0iBaPs8Gn,I have used tidymodels packages a few times,Q5_5,0,Translate prediction equations,NA
+R_3CHIGF0iBaPs8Gn,I have used tidymodels packages a few times,Q5_6,10,Model stacking ,NA
+R_3CHIGF0iBaPs8Gn,I have used tidymodels packages a few times,Q5_8,0,Post-processing in workflow(),NA
+R_3CHIGF0iBaPs8Gn,I have used tidymodels packages a few times,Q5_9,0,Ignore recipe steps,NA
+R_3CHIGF0iBaPs8Gn,I have used tidymodels packages a few times,Q5_10,0,H2O.ai support ,NA
+R_3CHIGF0iBaPs8Gn,I have used tidymodels packages a few times,Q5_12,0,Other,NA
+R_1eyKrSnH8Ux6gcq,I have used tidymodels packages a few times,Q5_1,20,Survival analysis,NA
+R_1eyKrSnH8Ux6gcq,I have used tidymodels packages a few times,Q5_2,10,Support for sparse data structures,NA
+R_1eyKrSnH8Ux6gcq,I have used tidymodels packages a few times,Q5_3,10,Adaptive resampling and better parallelization,NA
+R_1eyKrSnH8Ux6gcq,I have used tidymodels packages a few times,Q5_4,10,"Model monitoring, updating, & organization",NA
+R_1eyKrSnH8Ux6gcq,I have used tidymodels packages a few times,Q5_5,0,Translate prediction equations,NA
+R_1eyKrSnH8Ux6gcq,I have used tidymodels packages a few times,Q5_6,30,Model stacking ,NA
+R_1eyKrSnH8Ux6gcq,I have used tidymodels packages a few times,Q5_8,0,Post-processing in workflow(),NA
+R_1eyKrSnH8Ux6gcq,I have used tidymodels packages a few times,Q5_9,10,Ignore recipe steps,NA
+R_1eyKrSnH8Ux6gcq,I have used tidymodels packages a few times,Q5_10,10,H2O.ai support ,NA
+R_1eyKrSnH8Ux6gcq,I have used tidymodels packages a few times,Q5_12,0,Other,NA
+R_1FPW5PMZGrQ6D4k,I have used tidymodels packages a few times,Q5_1,10,Survival analysis,NA
+R_1FPW5PMZGrQ6D4k,I have used tidymodels packages a few times,Q5_2,20,Support for sparse data structures,NA
+R_1FPW5PMZGrQ6D4k,I have used tidymodels packages a few times,Q5_3,20,Adaptive resampling and better parallelization,NA
+R_1FPW5PMZGrQ6D4k,I have used tidymodels packages a few times,Q5_4,0,"Model monitoring, updating, & organization",NA
+R_1FPW5PMZGrQ6D4k,I have used tidymodels packages a few times,Q5_5,10,Translate prediction equations,NA
+R_1FPW5PMZGrQ6D4k,I have used tidymodels packages a few times,Q5_6,30,Model stacking ,NA
+R_1FPW5PMZGrQ6D4k,I have used tidymodels packages a few times,Q5_8,10,Post-processing in workflow(),NA
+R_1FPW5PMZGrQ6D4k,I have used tidymodels packages a few times,Q5_9,0,Ignore recipe steps,NA
+R_1FPW5PMZGrQ6D4k,I have used tidymodels packages a few times,Q5_10,0,H2O.ai support ,NA
+R_1FPW5PMZGrQ6D4k,I have used tidymodels packages a few times,Q5_12,0,Other,NA
+R_2OSGOJKXDL0ScrE,I have used tidymodels packages a few times,Q5_1,0,Survival analysis,NA
+R_2OSGOJKXDL0ScrE,I have used tidymodels packages a few times,Q5_2,0,Support for sparse data structures,NA
+R_2OSGOJKXDL0ScrE,I have used tidymodels packages a few times,Q5_3,0,Adaptive resampling and better parallelization,NA
+R_2OSGOJKXDL0ScrE,I have used tidymodels packages a few times,Q5_4,20,"Model monitoring, updating, & organization",NA
+R_2OSGOJKXDL0ScrE,I have used tidymodels packages a few times,Q5_5,0,Translate prediction equations,NA
+R_2OSGOJKXDL0ScrE,I have used tidymodels packages a few times,Q5_6,40,Model stacking ,NA
+R_2OSGOJKXDL0ScrE,I have used tidymodels packages a few times,Q5_8,0,Post-processing in workflow(),NA
+R_2OSGOJKXDL0ScrE,I have used tidymodels packages a few times,Q5_9,0,Ignore recipe steps,NA
+R_2OSGOJKXDL0ScrE,I have used tidymodels packages a few times,Q5_10,40,H2O.ai support ,NA
+R_2OSGOJKXDL0ScrE,I have used tidymodels packages a few times,Q5_12,0,Other,NA
+R_31FM5WDgr7CIjsy,I have used tidymodels packages a few times,Q5_1,10,Survival analysis,NA
+R_31FM5WDgr7CIjsy,I have used tidymodels packages a few times,Q5_2,10,Support for sparse data structures,NA
+R_31FM5WDgr7CIjsy,I have used tidymodels packages a few times,Q5_3,20,Adaptive resampling and better parallelization,NA
+R_31FM5WDgr7CIjsy,I have used tidymodels packages a few times,Q5_4,0,"Model monitoring, updating, & organization",NA
+R_31FM5WDgr7CIjsy,I have used tidymodels packages a few times,Q5_5,10,Translate prediction equations,NA
+R_31FM5WDgr7CIjsy,I have used tidymodels packages a few times,Q5_6,10,Model stacking ,NA
+R_31FM5WDgr7CIjsy,I have used tidymodels packages a few times,Q5_8,5,Post-processing in workflow(),NA
+R_31FM5WDgr7CIjsy,I have used tidymodels packages a few times,Q5_9,5,Ignore recipe steps,NA
+R_31FM5WDgr7CIjsy,I have used tidymodels packages a few times,Q5_10,30,H2O.ai support ,NA
+R_31FM5WDgr7CIjsy,I have used tidymodels packages a few times,Q5_12,0,Other,NA
+R_3Q03DiNSfaIOkZm,I have used tidymodels packages a few times,Q5_1,0,Survival analysis,NA
+R_3Q03DiNSfaIOkZm,I have used tidymodels packages a few times,Q5_2,0,Support for sparse data structures,NA
+R_3Q03DiNSfaIOkZm,I have used tidymodels packages a few times,Q5_3,20,Adaptive resampling and better parallelization,NA
+R_3Q03DiNSfaIOkZm,I have used tidymodels packages a few times,Q5_4,20,"Model monitoring, updating, & organization",NA
+R_3Q03DiNSfaIOkZm,I have used tidymodels packages a few times,Q5_5,0,Translate prediction equations,NA
+R_3Q03DiNSfaIOkZm,I have used tidymodels packages a few times,Q5_6,30,Model stacking ,NA
+R_3Q03DiNSfaIOkZm,I have used tidymodels packages a few times,Q5_8,30,Post-processing in workflow(),NA
+R_3Q03DiNSfaIOkZm,I have used tidymodels packages a few times,Q5_9,0,Ignore recipe steps,NA
+R_3Q03DiNSfaIOkZm,I have used tidymodels packages a few times,Q5_10,0,H2O.ai support ,NA
+R_3Q03DiNSfaIOkZm,I have used tidymodels packages a few times,Q5_12,0,Other,NA
+R_3Lh7jSl2jkyf71T,I have used tidymodels packages a few times,Q5_1,0,Survival analysis,NA
+R_3Lh7jSl2jkyf71T,I have used tidymodels packages a few times,Q5_2,0,Support for sparse data structures,NA
+R_3Lh7jSl2jkyf71T,I have used tidymodels packages a few times,Q5_3,30,Adaptive resampling and better parallelization,NA
+R_3Lh7jSl2jkyf71T,I have used tidymodels packages a few times,Q5_4,10,"Model monitoring, updating, & organization",NA
+R_3Lh7jSl2jkyf71T,I have used tidymodels packages a few times,Q5_5,40,Translate prediction equations,NA
+R_3Lh7jSl2jkyf71T,I have used tidymodels packages a few times,Q5_6,0,Model stacking ,NA
+R_3Lh7jSl2jkyf71T,I have used tidymodels packages a few times,Q5_8,10,Post-processing in workflow(),NA
+R_3Lh7jSl2jkyf71T,I have used tidymodels packages a few times,Q5_9,5,Ignore recipe steps,NA
+R_3Lh7jSl2jkyf71T,I have used tidymodels packages a few times,Q5_10,5,H2O.ai support ,NA
+R_3Lh7jSl2jkyf71T,I have used tidymodels packages a few times,Q5_12,0,Other,NA
+R_1mCxRKuh1nYljTc,I have used tidymodels packages a few times,Q5_1,0,Survival analysis,NA
+R_1mCxRKuh1nYljTc,I have used tidymodels packages a few times,Q5_2,0,Support for sparse data structures,NA
+R_1mCxRKuh1nYljTc,I have used tidymodels packages a few times,Q5_3,0,Adaptive resampling and better parallelization,NA
+R_1mCxRKuh1nYljTc,I have used tidymodels packages a few times,Q5_4,20,"Model monitoring, updating, & organization",NA
+R_1mCxRKuh1nYljTc,I have used tidymodels packages a few times,Q5_5,0,Translate prediction equations,NA
+R_1mCxRKuh1nYljTc,I have used tidymodels packages a few times,Q5_6,20,Model stacking ,NA
+R_1mCxRKuh1nYljTc,I have used tidymodels packages a few times,Q5_8,0,Post-processing in workflow(),NA
+R_1mCxRKuh1nYljTc,I have used tidymodels packages a few times,Q5_9,20,Ignore recipe steps,NA
+R_1mCxRKuh1nYljTc,I have used tidymodels packages a few times,Q5_10,0,H2O.ai support ,NA
+R_1mCxRKuh1nYljTc,I have used tidymodels packages a few times,Q5_12,40,Other,"Spatial econometric models, preprocessing, and sampling tools"
+R_yUPAgOFyW4ekhgd,I have used tidymodels packages a few times,Q5_1,10,Survival analysis,NA
+R_yUPAgOFyW4ekhgd,I have used tidymodels packages a few times,Q5_2,0,Support for sparse data structures,NA
+R_yUPAgOFyW4ekhgd,I have used tidymodels packages a few times,Q5_3,50,Adaptive resampling and better parallelization,NA
+R_yUPAgOFyW4ekhgd,I have used tidymodels packages a few times,Q5_4,0,"Model monitoring, updating, & organization",NA
+R_yUPAgOFyW4ekhgd,I have used tidymodels packages a few times,Q5_5,30,Translate prediction equations,NA
+R_yUPAgOFyW4ekhgd,I have used tidymodels packages a few times,Q5_6,10,Model stacking ,NA
+R_yUPAgOFyW4ekhgd,I have used tidymodels packages a few times,Q5_8,0,Post-processing in workflow(),NA
+R_yUPAgOFyW4ekhgd,I have used tidymodels packages a few times,Q5_9,0,Ignore recipe steps,NA
+R_yUPAgOFyW4ekhgd,I have used tidymodels packages a few times,Q5_10,0,H2O.ai support ,NA
+R_yUPAgOFyW4ekhgd,I have used tidymodels packages a few times,Q5_12,0,Other,NA
+R_yszz0TvqB6A4Mp3,I have used tidymodels packages a few times,Q5_1,0,Survival analysis,NA
+R_yszz0TvqB6A4Mp3,I have used tidymodels packages a few times,Q5_2,0,Support for sparse data structures,NA
+R_yszz0TvqB6A4Mp3,I have used tidymodels packages a few times,Q5_3,20,Adaptive resampling and better parallelization,NA
+R_yszz0TvqB6A4Mp3,I have used tidymodels packages a few times,Q5_4,0,"Model monitoring, updating, & organization",NA
+R_yszz0TvqB6A4Mp3,I have used tidymodels packages a few times,Q5_5,20,Translate prediction equations,NA
+R_yszz0TvqB6A4Mp3,I have used tidymodels packages a few times,Q5_6,10,Model stacking ,NA
+R_yszz0TvqB6A4Mp3,I have used tidymodels packages a few times,Q5_8,0,Post-processing in workflow(),NA
+R_yszz0TvqB6A4Mp3,I have used tidymodels packages a few times,Q5_9,0,Ignore recipe steps,NA
+R_yszz0TvqB6A4Mp3,I have used tidymodels packages a few times,Q5_10,0,H2O.ai support ,NA
+R_yszz0TvqB6A4Mp3,I have used tidymodels packages a few times,Q5_12,50,Other,Implement XGBoost on Spark engine (XGBoost4J)
+R_2zXSvIvOvt5M090,I have never used tidymodels,Q5_1,0,Survival analysis,NA
+R_2zXSvIvOvt5M090,I have never used tidymodels,Q5_2,0,Support for sparse data structures,NA
+R_2zXSvIvOvt5M090,I have never used tidymodels,Q5_3,10,Adaptive resampling and better parallelization,NA
+R_2zXSvIvOvt5M090,I have never used tidymodels,Q5_4,40,"Model monitoring, updating, & organization",NA
+R_2zXSvIvOvt5M090,I have never used tidymodels,Q5_5,0,Translate prediction equations,NA
+R_2zXSvIvOvt5M090,I have never used tidymodels,Q5_6,30,Model stacking ,NA
+R_2zXSvIvOvt5M090,I have never used tidymodels,Q5_8,20,Post-processing in workflow(),NA
+R_2zXSvIvOvt5M090,I have never used tidymodels,Q5_9,0,Ignore recipe steps,NA
+R_2zXSvIvOvt5M090,I have never used tidymodels,Q5_10,0,H2O.ai support ,NA
+R_2zXSvIvOvt5M090,I have never used tidymodels,Q5_12,0,Other,NA
+R_12MvNEX6JlEDD7y,I have used tidymodels packages a few times,Q5_1,5,Survival analysis,NA
+R_12MvNEX6JlEDD7y,I have used tidymodels packages a few times,Q5_2,10,Support for sparse data structures,NA
+R_12MvNEX6JlEDD7y,I have used tidymodels packages a few times,Q5_3,20,Adaptive resampling and better parallelization,NA
+R_12MvNEX6JlEDD7y,I have used tidymodels packages a few times,Q5_4,5,"Model monitoring, updating, & organization",NA
+R_12MvNEX6JlEDD7y,I have used tidymodels packages a few times,Q5_5,50,Translate prediction equations,NA
+R_12MvNEX6JlEDD7y,I have used tidymodels packages a few times,Q5_6,0,Model stacking ,NA
+R_12MvNEX6JlEDD7y,I have used tidymodels packages a few times,Q5_8,5,Post-processing in workflow(),NA
+R_12MvNEX6JlEDD7y,I have used tidymodels packages a few times,Q5_9,5,Ignore recipe steps,NA
+R_12MvNEX6JlEDD7y,I have used tidymodels packages a few times,Q5_10,0,H2O.ai support ,NA
+R_12MvNEX6JlEDD7y,I have used tidymodels packages a few times,Q5_12,0,Other,NA
+R_2dWqRWRrNHu7kSK,I have used tidymodels packages a few times,Q5_1,0,Survival analysis,NA
+R_2dWqRWRrNHu7kSK,I have used tidymodels packages a few times,Q5_2,0,Support for sparse data structures,NA
+R_2dWqRWRrNHu7kSK,I have used tidymodels packages a few times,Q5_3,0,Adaptive resampling and better parallelization,NA
+R_2dWqRWRrNHu7kSK,I have used tidymodels packages a few times,Q5_4,10,"Model monitoring, updating, & organization",NA
+R_2dWqRWRrNHu7kSK,I have used tidymodels packages a few times,Q5_5,30,Translate prediction equations,NA
+R_2dWqRWRrNHu7kSK,I have used tidymodels packages a few times,Q5_6,0,Model stacking ,NA
+R_2dWqRWRrNHu7kSK,I have used tidymodels packages a few times,Q5_8,10,Post-processing in workflow(),NA
+R_2dWqRWRrNHu7kSK,I have used tidymodels packages a few times,Q5_9,0,Ignore recipe steps,NA
+R_2dWqRWRrNHu7kSK,I have used tidymodels packages a few times,Q5_10,30,H2O.ai support ,NA
+R_2dWqRWRrNHu7kSK,I have used tidymodels packages a few times,Q5_12,20,Other,Integration with caret
+R_BXHrGLMGuZElke5,I have contributed to tidymodels packages or taught others how to use them,Q5_1,0,Survival analysis,NA
+R_BXHrGLMGuZElke5,I have contributed to tidymodels packages or taught others how to use them,Q5_2,0,Support for sparse data structures,NA
+R_BXHrGLMGuZElke5,I have contributed to tidymodels packages or taught others how to use them,Q5_3,10,Adaptive resampling and better parallelization,NA
+R_BXHrGLMGuZElke5,I have contributed to tidymodels packages or taught others how to use them,Q5_4,70,"Model monitoring, updating, & organization",NA
+R_BXHrGLMGuZElke5,I have contributed to tidymodels packages or taught others how to use them,Q5_5,0,Translate prediction equations,NA
+R_BXHrGLMGuZElke5,I have contributed to tidymodels packages or taught others how to use them,Q5_6,0,Model stacking ,NA
+R_BXHrGLMGuZElke5,I have contributed to tidymodels packages or taught others how to use them,Q5_8,20,Post-processing in workflow(),NA
+R_BXHrGLMGuZElke5,I have contributed to tidymodels packages or taught others how to use them,Q5_9,0,Ignore recipe steps,NA
+R_BXHrGLMGuZElke5,I have contributed to tidymodels packages or taught others how to use them,Q5_10,0,H2O.ai support ,NA
+R_BXHrGLMGuZElke5,I have contributed to tidymodels packages or taught others how to use them,Q5_12,0,Other,NA
+R_xhFL3UObMmOHUgF,I have used tidymodels packages a few times,Q5_1,0,Survival analysis,NA
+R_xhFL3UObMmOHUgF,I have used tidymodels packages a few times,Q5_2,0,Support for sparse data structures,NA
+R_xhFL3UObMmOHUgF,I have used tidymodels packages a few times,Q5_3,0,Adaptive resampling and better parallelization,NA
+R_xhFL3UObMmOHUgF,I have used tidymodels packages a few times,Q5_4,0,"Model monitoring, updating, & organization",NA
+R_xhFL3UObMmOHUgF,I have used tidymodels packages a few times,Q5_5,50,Translate prediction equations,NA
+R_xhFL3UObMmOHUgF,I have used tidymodels packages a few times,Q5_6,0,Model stacking ,NA
+R_xhFL3UObMmOHUgF,I have used tidymodels packages a few times,Q5_8,0,Post-processing in workflow(),NA
+R_xhFL3UObMmOHUgF,I have used tidymodels packages a few times,Q5_9,0,Ignore recipe steps,NA
+R_xhFL3UObMmOHUgF,I have used tidymodels packages a few times,Q5_10,50,H2O.ai support ,NA
+R_xhFL3UObMmOHUgF,I have used tidymodels packages a few times,Q5_12,0,Other,NA
+R_bk24VRIO9RjjmAF,I have used tidymodels packages many times,Q5_1,0,Survival analysis,NA
+R_bk24VRIO9RjjmAF,I have used tidymodels packages many times,Q5_2,0,Support for sparse data structures,NA
+R_bk24VRIO9RjjmAF,I have used tidymodels packages many times,Q5_3,10,Adaptive resampling and better parallelization,NA
+R_bk24VRIO9RjjmAF,I have used tidymodels packages many times,Q5_4,50,"Model monitoring, updating, & organization",NA
+R_bk24VRIO9RjjmAF,I have used tidymodels packages many times,Q5_5,0,Translate prediction equations,NA
+R_bk24VRIO9RjjmAF,I have used tidymodels packages many times,Q5_6,20,Model stacking ,NA
+R_bk24VRIO9RjjmAF,I have used tidymodels packages many times,Q5_8,20,Post-processing in workflow(),NA
+R_bk24VRIO9RjjmAF,I have used tidymodels packages many times,Q5_9,0,Ignore recipe steps,NA
+R_bk24VRIO9RjjmAF,I have used tidymodels packages many times,Q5_10,0,H2O.ai support ,NA
+R_bk24VRIO9RjjmAF,I have used tidymodels packages many times,Q5_12,0,Other,NA
+R_2uIjy42xIyDrWWV,I have contributed to tidymodels packages or taught others how to use them,Q5_1,0,Survival analysis,NA
+R_2uIjy42xIyDrWWV,I have contributed to tidymodels packages or taught others how to use them,Q5_2,0,Support for sparse data structures,NA
+R_2uIjy42xIyDrWWV,I have contributed to tidymodels packages or taught others how to use them,Q5_3,0,Adaptive resampling and better parallelization,NA
+R_2uIjy42xIyDrWWV,I have contributed to tidymodels packages or taught others how to use them,Q5_4,20,"Model monitoring, updating, & organization",NA
+R_2uIjy42xIyDrWWV,I have contributed to tidymodels packages or taught others how to use them,Q5_5,0,Translate prediction equations,NA
+R_2uIjy42xIyDrWWV,I have contributed to tidymodels packages or taught others how to use them,Q5_6,50,Model stacking ,NA
+R_2uIjy42xIyDrWWV,I have contributed to tidymodels packages or taught others how to use them,Q5_8,30,Post-processing in workflow(),NA
+R_2uIjy42xIyDrWWV,I have contributed to tidymodels packages or taught others how to use them,Q5_9,0,Ignore recipe steps,NA
+R_2uIjy42xIyDrWWV,I have contributed to tidymodels packages or taught others how to use them,Q5_10,0,H2O.ai support ,NA
+R_2uIjy42xIyDrWWV,I have contributed to tidymodels packages or taught others how to use them,Q5_12,0,Other,NA
+R_1GDnwrJf8oiElkL,I have used tidymodels packages a few times,Q5_1,0,Survival analysis,NA
+R_1GDnwrJf8oiElkL,I have used tidymodels packages a few times,Q5_2,0,Support for sparse data structures,NA
+R_1GDnwrJf8oiElkL,I have used tidymodels packages a few times,Q5_3,70,Adaptive resampling and better parallelization,NA
+R_1GDnwrJf8oiElkL,I have used tidymodels packages a few times,Q5_4,30,"Model monitoring, updating, & organization",NA
+R_1GDnwrJf8oiElkL,I have used tidymodels packages a few times,Q5_5,0,Translate prediction equations,NA
+R_1GDnwrJf8oiElkL,I have used tidymodels packages a few times,Q5_6,0,Model stacking ,NA
+R_1GDnwrJf8oiElkL,I have used tidymodels packages a few times,Q5_8,0,Post-processing in workflow(),NA
+R_1GDnwrJf8oiElkL,I have used tidymodels packages a few times,Q5_9,0,Ignore recipe steps,NA
+R_1GDnwrJf8oiElkL,I have used tidymodels packages a few times,Q5_10,0,H2O.ai support ,NA
+R_1GDnwrJf8oiElkL,I have used tidymodels packages a few times,Q5_12,0,Other,NA
+R_2v6XjiLT2JFLBX2,I have used tidymodels packages a few times,Q5_1,0,Survival analysis,NA
+R_2v6XjiLT2JFLBX2,I have used tidymodels packages a few times,Q5_2,10,Support for sparse data structures,NA
+R_2v6XjiLT2JFLBX2,I have used tidymodels packages a few times,Q5_3,15,Adaptive resampling and better parallelization,NA
+R_2v6XjiLT2JFLBX2,I have used tidymodels packages a few times,Q5_4,40,"Model monitoring, updating, & organization",NA
+R_2v6XjiLT2JFLBX2,I have used tidymodels packages a few times,Q5_5,0,Translate prediction equations,NA
+R_2v6XjiLT2JFLBX2,I have used tidymodels packages a few times,Q5_6,10,Model stacking ,NA
+R_2v6XjiLT2JFLBX2,I have used tidymodels packages a few times,Q5_8,10,Post-processing in workflow(),NA
+R_2v6XjiLT2JFLBX2,I have used tidymodels packages a few times,Q5_9,0,Ignore recipe steps,NA
+R_2v6XjiLT2JFLBX2,I have used tidymodels packages a few times,Q5_10,0,H2O.ai support ,NA
+R_2v6XjiLT2JFLBX2,I have used tidymodels packages a few times,Q5_12,15,Other,Online Learning (constantly updating your model)
+R_1gkjeuOuJj0kOgK,I have used tidymodels packages a few times,Q5_1,5,Survival analysis,NA
+R_1gkjeuOuJj0kOgK,I have used tidymodels packages a few times,Q5_2,5,Support for sparse data structures,NA
+R_1gkjeuOuJj0kOgK,I have used tidymodels packages a few times,Q5_3,5,Adaptive resampling and better parallelization,NA
+R_1gkjeuOuJj0kOgK,I have used tidymodels packages a few times,Q5_4,25,"Model monitoring, updating, & organization",NA
+R_1gkjeuOuJj0kOgK,I have used tidymodels packages a few times,Q5_5,30,Translate prediction equations,NA
+R_1gkjeuOuJj0kOgK,I have used tidymodels packages a few times,Q5_6,5,Model stacking ,NA
+R_1gkjeuOuJj0kOgK,I have used tidymodels packages a few times,Q5_8,5,Post-processing in workflow(),NA
+R_1gkjeuOuJj0kOgK,I have used tidymodels packages a few times,Q5_9,5,Ignore recipe steps,NA
+R_1gkjeuOuJj0kOgK,I have used tidymodels packages a few times,Q5_10,15,H2O.ai support ,NA
+R_1gkjeuOuJj0kOgK,I have used tidymodels packages a few times,Q5_12,0,Other,NA
+R_1Kpx1b3vJ4uXudU,I have used tidymodels packages a few times,Q5_1,0,Survival analysis,NA
+R_1Kpx1b3vJ4uXudU,I have used tidymodels packages a few times,Q5_2,10,Support for sparse data structures,NA
+R_1Kpx1b3vJ4uXudU,I have used tidymodels packages a few times,Q5_3,0,Adaptive resampling and better parallelization,NA
+R_1Kpx1b3vJ4uXudU,I have used tidymodels packages a few times,Q5_4,0,"Model monitoring, updating, & organization",NA
+R_1Kpx1b3vJ4uXudU,I have used tidymodels packages a few times,Q5_5,20,Translate prediction equations,NA
+R_1Kpx1b3vJ4uXudU,I have used tidymodels packages a few times,Q5_6,40,Model stacking ,NA
+R_1Kpx1b3vJ4uXudU,I have used tidymodels packages a few times,Q5_8,0,Post-processing in workflow(),NA
+R_1Kpx1b3vJ4uXudU,I have used tidymodels packages a few times,Q5_9,30,Ignore recipe steps,NA
+R_1Kpx1b3vJ4uXudU,I have used tidymodels packages a few times,Q5_10,0,H2O.ai support ,NA
+R_1Kpx1b3vJ4uXudU,I have used tidymodels packages a few times,Q5_12,0,Other,NA
+R_3PXlg6DLhTd6spo,I have used tidymodels packages a few times,Q5_1,20,Survival analysis,NA
+R_3PXlg6DLhTd6spo,I have used tidymodels packages a few times,Q5_2,0,Support for sparse data structures,NA
+R_3PXlg6DLhTd6spo,I have used tidymodels packages a few times,Q5_3,20,Adaptive resampling and better parallelization,NA
+R_3PXlg6DLhTd6spo,I have used tidymodels packages a few times,Q5_4,10,"Model monitoring, updating, & organization",NA
+R_3PXlg6DLhTd6spo,I have used tidymodels packages a few times,Q5_5,0,Translate prediction equations,NA
+R_3PXlg6DLhTd6spo,I have used tidymodels packages a few times,Q5_6,0,Model stacking ,NA
+R_3PXlg6DLhTd6spo,I have used tidymodels packages a few times,Q5_8,50,Post-processing in workflow(),NA
+R_3PXlg6DLhTd6spo,I have used tidymodels packages a few times,Q5_9,0,Ignore recipe steps,NA
+R_3PXlg6DLhTd6spo,I have used tidymodels packages a few times,Q5_10,0,H2O.ai support ,NA
+R_3PXlg6DLhTd6spo,I have used tidymodels packages a few times,Q5_12,0,Other,NA
+R_b8hS5HKIe4OPj2x,I have never used tidymodels,Q5_1,0,Survival analysis,NA
+R_b8hS5HKIe4OPj2x,I have never used tidymodels,Q5_2,0,Support for sparse data structures,NA
+R_b8hS5HKIe4OPj2x,I have never used tidymodels,Q5_3,50,Adaptive resampling and better parallelization,NA
+R_b8hS5HKIe4OPj2x,I have never used tidymodels,Q5_4,50,"Model monitoring, updating, & organization",NA
+R_b8hS5HKIe4OPj2x,I have never used tidymodels,Q5_5,0,Translate prediction equations,NA
+R_b8hS5HKIe4OPj2x,I have never used tidymodels,Q5_6,0,Model stacking ,NA
+R_b8hS5HKIe4OPj2x,I have never used tidymodels,Q5_8,0,Post-processing in workflow(),NA
+R_b8hS5HKIe4OPj2x,I have never used tidymodels,Q5_9,0,Ignore recipe steps,NA
+R_b8hS5HKIe4OPj2x,I have never used tidymodels,Q5_10,0,H2O.ai support ,NA
+R_b8hS5HKIe4OPj2x,I have never used tidymodels,Q5_12,0,Other,NA
+R_Ui03OjiaCBG90hr,I have used tidymodels packages many times,Q5_1,0,Survival analysis,NA
+R_Ui03OjiaCBG90hr,I have used tidymodels packages many times,Q5_2,0,Support for sparse data structures,NA
+R_Ui03OjiaCBG90hr,I have used tidymodels packages many times,Q5_3,60,Adaptive resampling and better parallelization,NA
+R_Ui03OjiaCBG90hr,I have used tidymodels packages many times,Q5_4,0,"Model monitoring, updating, & organization",NA
+R_Ui03OjiaCBG90hr,I have used tidymodels packages many times,Q5_5,0,Translate prediction equations,NA
+R_Ui03OjiaCBG90hr,I have used tidymodels packages many times,Q5_6,0,Model stacking ,NA
+R_Ui03OjiaCBG90hr,I have used tidymodels packages many times,Q5_8,0,Post-processing in workflow(),NA
+R_Ui03OjiaCBG90hr,I have used tidymodels packages many times,Q5_9,40,Ignore recipe steps,NA
+R_Ui03OjiaCBG90hr,I have used tidymodels packages many times,Q5_10,0,H2O.ai support ,NA
+R_Ui03OjiaCBG90hr,I have used tidymodels packages many times,Q5_12,0,Other,NA
+R_3EZvU33ARlHXo4t,I have used tidymodels packages a few times,Q5_1,0,Survival analysis,NA
+R_3EZvU33ARlHXo4t,I have used tidymodels packages a few times,Q5_2,0,Support for sparse data structures,NA
+R_3EZvU33ARlHXo4t,I have used tidymodels packages a few times,Q5_3,0,Adaptive resampling and better parallelization,NA
+R_3EZvU33ARlHXo4t,I have used tidymodels packages a few times,Q5_4,25,"Model monitoring, updating, & organization",NA
+R_3EZvU33ARlHXo4t,I have used tidymodels packages a few times,Q5_5,50,Translate prediction equations,NA
+R_3EZvU33ARlHXo4t,I have used tidymodels packages a few times,Q5_6,25,Model stacking ,NA
+R_3EZvU33ARlHXo4t,I have used tidymodels packages a few times,Q5_8,0,Post-processing in workflow(),NA
+R_3EZvU33ARlHXo4t,I have used tidymodels packages a few times,Q5_9,0,Ignore recipe steps,NA
+R_3EZvU33ARlHXo4t,I have used tidymodels packages a few times,Q5_10,0,H2O.ai support ,NA
+R_3EZvU33ARlHXo4t,I have used tidymodels packages a few times,Q5_12,0,Other,NA
+R_216DUSALjb7UX2T,I have used tidymodels packages a few times,Q5_1,0,Survival analysis,NA
+R_216DUSALjb7UX2T,I have used tidymodels packages a few times,Q5_2,5,Support for sparse data structures,NA
+R_216DUSALjb7UX2T,I have used tidymodels packages a few times,Q5_3,10,Adaptive resampling and better parallelization,NA
+R_216DUSALjb7UX2T,I have used tidymodels packages a few times,Q5_4,0,"Model monitoring, updating, & organization",NA
+R_216DUSALjb7UX2T,I have used tidymodels packages a few times,Q5_5,30,Translate prediction equations,NA
+R_216DUSALjb7UX2T,I have used tidymodels packages a few times,Q5_6,20,Model stacking ,NA
+R_216DUSALjb7UX2T,I have used tidymodels packages a few times,Q5_8,15,Post-processing in workflow(),NA
+R_216DUSALjb7UX2T,I have used tidymodels packages a few times,Q5_9,5,Ignore recipe steps,NA
+R_216DUSALjb7UX2T,I have used tidymodels packages a few times,Q5_10,15,H2O.ai support ,NA
+R_216DUSALjb7UX2T,I have used tidymodels packages a few times,Q5_12,0,Other,NA
+R_pKvKdv1vy1fQZq1,I have used tidymodels packages a few times,Q5_1,0,Survival analysis,NA
+R_pKvKdv1vy1fQZq1,I have used tidymodels packages a few times,Q5_2,0,Support for sparse data structures,NA
+R_pKvKdv1vy1fQZq1,I have used tidymodels packages a few times,Q5_3,20,Adaptive resampling and better parallelization,NA
+R_pKvKdv1vy1fQZq1,I have used tidymodels packages a few times,Q5_4,20,"Model monitoring, updating, & organization",NA
+R_pKvKdv1vy1fQZq1,I have used tidymodels packages a few times,Q5_5,0,Translate prediction equations,NA
+R_pKvKdv1vy1fQZq1,I have used tidymodels packages a few times,Q5_6,20,Model stacking ,NA
+R_pKvKdv1vy1fQZq1,I have used tidymodels packages a few times,Q5_8,20,Post-processing in workflow(),NA
+R_pKvKdv1vy1fQZq1,I have used tidymodels packages a few times,Q5_9,0,Ignore recipe steps,NA
+R_pKvKdv1vy1fQZq1,I have used tidymodels packages a few times,Q5_10,0,H2O.ai support ,NA
+R_pKvKdv1vy1fQZq1,I have used tidymodels packages a few times,Q5_12,20,Other,"Production (plumber, docker)"
+R_2traftsA32Psz4t,I have used tidymodels packages a few times,Q5_1,10,Survival analysis,NA
+R_2traftsA32Psz4t,I have used tidymodels packages a few times,Q5_2,0,Support for sparse data structures,NA
+R_2traftsA32Psz4t,I have used tidymodels packages a few times,Q5_3,25,Adaptive resampling and better parallelization,NA
+R_2traftsA32Psz4t,I have used tidymodels packages a few times,Q5_4,15,"Model monitoring, updating, & organization",NA
+R_2traftsA32Psz4t,I have used tidymodels packages a few times,Q5_5,0,Translate prediction equations,NA
+R_2traftsA32Psz4t,I have used tidymodels packages a few times,Q5_6,15,Model stacking ,NA
+R_2traftsA32Psz4t,I have used tidymodels packages a few times,Q5_8,15,Post-processing in workflow(),NA
+R_2traftsA32Psz4t,I have used tidymodels packages a few times,Q5_9,0,Ignore recipe steps,NA
+R_2traftsA32Psz4t,I have used tidymodels packages a few times,Q5_10,20,H2O.ai support ,NA
+R_2traftsA32Psz4t,I have used tidymodels packages a few times,Q5_12,0,Other,NA
+R_1KpTY8XXeTr5Ga7,I have contributed to tidymodels packages or taught others how to use them,Q5_1,10,Survival analysis,NA
+R_1KpTY8XXeTr5Ga7,I have contributed to tidymodels packages or taught others how to use them,Q5_2,5,Support for sparse data structures,NA
+R_1KpTY8XXeTr5Ga7,I have contributed to tidymodels packages or taught others how to use them,Q5_3,30,Adaptive resampling and better parallelization,NA
+R_1KpTY8XXeTr5Ga7,I have contributed to tidymodels packages or taught others how to use them,Q5_4,5,"Model monitoring, updating, & organization",NA
+R_1KpTY8XXeTr5Ga7,I have contributed to tidymodels packages or taught others how to use them,Q5_5,0,Translate prediction equations,NA
+R_1KpTY8XXeTr5Ga7,I have contributed to tidymodels packages or taught others how to use them,Q5_6,10,Model stacking ,NA
+R_1KpTY8XXeTr5Ga7,I have contributed to tidymodels packages or taught others how to use them,Q5_8,5,Post-processing in workflow(),NA
+R_1KpTY8XXeTr5Ga7,I have contributed to tidymodels packages or taught others how to use them,Q5_9,10,Ignore recipe steps,NA
+R_1KpTY8XXeTr5Ga7,I have contributed to tidymodels packages or taught others how to use them,Q5_10,0,H2O.ai support ,NA
+R_1KpTY8XXeTr5Ga7,I have contributed to tidymodels packages or taught others how to use them,Q5_12,25,Other,Lasso selection steps
+R_r8tVyhaiSVJq6oF,I have never used tidymodels,Q5_1,0,Survival analysis,NA
+R_r8tVyhaiSVJq6oF,I have never used tidymodels,Q5_2,0,Support for sparse data structures,NA
+R_r8tVyhaiSVJq6oF,I have never used tidymodels,Q5_3,0,Adaptive resampling and better parallelization,NA
+R_r8tVyhaiSVJq6oF,I have never used tidymodels,Q5_4,30,"Model monitoring, updating, & organization",NA
+R_r8tVyhaiSVJq6oF,I have never used tidymodels,Q5_5,0,Translate prediction equations,NA
+R_r8tVyhaiSVJq6oF,I have never used tidymodels,Q5_6,30,Model stacking ,NA
+R_r8tVyhaiSVJq6oF,I have never used tidymodels,Q5_8,10,Post-processing in workflow(),NA
+R_r8tVyhaiSVJq6oF,I have never used tidymodels,Q5_9,0,Ignore recipe steps,NA
+R_r8tVyhaiSVJq6oF,I have never used tidymodels,Q5_10,0,H2O.ai support ,NA
+R_r8tVyhaiSVJq6oF,I have never used tidymodels,Q5_12,30,Other,LASSO selection steps
+R_3O7mcPUIUNwxMlC,I have never used tidymodels,Q5_1,0,Survival analysis,NA
+R_3O7mcPUIUNwxMlC,I have never used tidymodels,Q5_2,20,Support for sparse data structures,NA
+R_3O7mcPUIUNwxMlC,I have never used tidymodels,Q5_3,20,Adaptive resampling and better parallelization,NA
+R_3O7mcPUIUNwxMlC,I have never used tidymodels,Q5_4,20,"Model monitoring, updating, & organization",NA
+R_3O7mcPUIUNwxMlC,I have never used tidymodels,Q5_5,20,Translate prediction equations,NA
+R_3O7mcPUIUNwxMlC,I have never used tidymodels,Q5_6,20,Model stacking ,NA
+R_3O7mcPUIUNwxMlC,I have never used tidymodels,Q5_8,0,Post-processing in workflow(),NA
+R_3O7mcPUIUNwxMlC,I have never used tidymodels,Q5_9,0,Ignore recipe steps,NA
+R_3O7mcPUIUNwxMlC,I have never used tidymodels,Q5_10,0,H2O.ai support ,NA
+R_3O7mcPUIUNwxMlC,I have never used tidymodels,Q5_12,0,Other,NA
+R_8uH0dPoTAaHHYwF,I have used tidymodels packages a few times,Q5_1,0,Survival analysis,NA
+R_8uH0dPoTAaHHYwF,I have used tidymodels packages a few times,Q5_2,40,Support for sparse data structures,NA
+R_8uH0dPoTAaHHYwF,I have used tidymodels packages a few times,Q5_3,35,Adaptive resampling and better parallelization,NA
+R_8uH0dPoTAaHHYwF,I have used tidymodels packages a few times,Q5_4,0,"Model monitoring, updating, & organization",NA
+R_8uH0dPoTAaHHYwF,I have used tidymodels packages a few times,Q5_5,0,Translate prediction equations,NA
+R_8uH0dPoTAaHHYwF,I have used tidymodels packages a few times,Q5_6,0,Model stacking ,NA
+R_8uH0dPoTAaHHYwF,I have used tidymodels packages a few times,Q5_8,10,Post-processing in workflow(),NA
+R_8uH0dPoTAaHHYwF,I have used tidymodels packages a few times,Q5_9,0,Ignore recipe steps,NA
+R_8uH0dPoTAaHHYwF,I have used tidymodels packages a few times,Q5_10,15,H2O.ai support ,NA
+R_8uH0dPoTAaHHYwF,I have used tidymodels packages a few times,Q5_12,0,Other,NA
+R_1LMXvcWTUVFNfuK,I have never used tidymodels,Q5_1,0,Survival analysis,NA
+R_1LMXvcWTUVFNfuK,I have never used tidymodels,Q5_2,10,Support for sparse data structures,NA
+R_1LMXvcWTUVFNfuK,I have never used tidymodels,Q5_3,25,Adaptive resampling and better parallelization,NA
+R_1LMXvcWTUVFNfuK,I have never used tidymodels,Q5_4,20,"Model monitoring, updating, & organization",NA
+R_1LMXvcWTUVFNfuK,I have never used tidymodels,Q5_5,0,Translate prediction equations,NA
+R_1LMXvcWTUVFNfuK,I have never used tidymodels,Q5_6,10,Model stacking ,NA
+R_1LMXvcWTUVFNfuK,I have never used tidymodels,Q5_8,10,Post-processing in workflow(),NA
+R_1LMXvcWTUVFNfuK,I have never used tidymodels,Q5_9,25,Ignore recipe steps,NA
+R_1LMXvcWTUVFNfuK,I have never used tidymodels,Q5_10,0,H2O.ai support ,NA
+R_1LMXvcWTUVFNfuK,I have never used tidymodels,Q5_12,0,Other,NA
+R_3nocHB8ruQo7MmW,I have contributed to tidymodels packages or taught others how to use them,Q5_1,0,Survival analysis,NA
+R_3nocHB8ruQo7MmW,I have contributed to tidymodels packages or taught others how to use them,Q5_2,5,Support for sparse data structures,NA
+R_3nocHB8ruQo7MmW,I have contributed to tidymodels packages or taught others how to use them,Q5_3,30,Adaptive resampling and better parallelization,NA
+R_3nocHB8ruQo7MmW,I have contributed to tidymodels packages or taught others how to use them,Q5_4,20,"Model monitoring, updating, & organization",NA
+R_3nocHB8ruQo7MmW,I have contributed to tidymodels packages or taught others how to use them,Q5_5,0,Translate prediction equations,NA
+R_3nocHB8ruQo7MmW,I have contributed to tidymodels packages or taught others how to use them,Q5_6,30,Model stacking ,NA
+R_3nocHB8ruQo7MmW,I have contributed to tidymodels packages or taught others how to use them,Q5_8,10,Post-processing in workflow(),NA
+R_3nocHB8ruQo7MmW,I have contributed to tidymodels packages or taught others how to use them,Q5_9,5,Ignore recipe steps,NA
+R_3nocHB8ruQo7MmW,I have contributed to tidymodels packages or taught others how to use them,Q5_10,0,H2O.ai support ,NA
+R_3nocHB8ruQo7MmW,I have contributed to tidymodels packages or taught others how to use them,Q5_12,0,Other,NA
+R_3JIXm4YqJ2WBpKT,I have used tidymodels packages a few times,Q5_1,50,Survival analysis,NA
+R_3JIXm4YqJ2WBpKT,I have used tidymodels packages a few times,Q5_2,0,Support for sparse data structures,NA
+R_3JIXm4YqJ2WBpKT,I have used tidymodels packages a few times,Q5_3,20,Adaptive resampling and better parallelization,NA
+R_3JIXm4YqJ2WBpKT,I have used tidymodels packages a few times,Q5_4,0,"Model monitoring, updating, & organization",NA
+R_3JIXm4YqJ2WBpKT,I have used tidymodels packages a few times,Q5_5,0,Translate prediction equations,NA
+R_3JIXm4YqJ2WBpKT,I have used tidymodels packages a few times,Q5_6,0,Model stacking ,NA
+R_3JIXm4YqJ2WBpKT,I have used tidymodels packages a few times,Q5_8,30,Post-processing in workflow(),NA
+R_3JIXm4YqJ2WBpKT,I have used tidymodels packages a few times,Q5_9,0,Ignore recipe steps,NA
+R_3JIXm4YqJ2WBpKT,I have used tidymodels packages a few times,Q5_10,0,H2O.ai support ,NA
+R_3JIXm4YqJ2WBpKT,I have used tidymodels packages a few times,Q5_12,0,Other,NA
+R_1fjavr1YcloEF3V,I have used tidymodels packages a few times,Q5_1,0,Survival analysis,NA
+R_1fjavr1YcloEF3V,I have used tidymodels packages a few times,Q5_2,0,Support for sparse data structures,NA
+R_1fjavr1YcloEF3V,I have used tidymodels packages a few times,Q5_3,30,Adaptive resampling and better parallelization,NA
+R_1fjavr1YcloEF3V,I have used tidymodels packages a few times,Q5_4,0,"Model monitoring, updating, & organization",NA
+R_1fjavr1YcloEF3V,I have used tidymodels packages a few times,Q5_5,20,Translate prediction equations,NA
+R_1fjavr1YcloEF3V,I have used tidymodels packages a few times,Q5_6,0,Model stacking ,NA
+R_1fjavr1YcloEF3V,I have used tidymodels packages a few times,Q5_8,0,Post-processing in workflow(),NA
+R_1fjavr1YcloEF3V,I have used tidymodels packages a few times,Q5_9,0,Ignore recipe steps,NA
+R_1fjavr1YcloEF3V,I have used tidymodels packages a few times,Q5_10,0,H2O.ai support ,NA
+R_1fjavr1YcloEF3V,I have used tidymodels packages a few times,Q5_12,50,Other,spatial crossvalidation
+R_2956eVH1yKU5FdE,I have used tidymodels packages a few times,Q5_1,25,Survival analysis,NA
+R_2956eVH1yKU5FdE,I have used tidymodels packages a few times,Q5_2,0,Support for sparse data structures,NA
+R_2956eVH1yKU5FdE,I have used tidymodels packages a few times,Q5_3,0,Adaptive resampling and better parallelization,NA
+R_2956eVH1yKU5FdE,I have used tidymodels packages a few times,Q5_4,25,"Model monitoring, updating, & organization",NA
+R_2956eVH1yKU5FdE,I have used tidymodels packages a few times,Q5_5,0,Translate prediction equations,NA
+R_2956eVH1yKU5FdE,I have used tidymodels packages a few times,Q5_6,25,Model stacking ,NA
+R_2956eVH1yKU5FdE,I have used tidymodels packages a few times,Q5_8,25,Post-processing in workflow(),NA
+R_2956eVH1yKU5FdE,I have used tidymodels packages a few times,Q5_9,0,Ignore recipe steps,NA
+R_2956eVH1yKU5FdE,I have used tidymodels packages a few times,Q5_10,0,H2O.ai support ,NA
+R_2956eVH1yKU5FdE,I have used tidymodels packages a few times,Q5_12,0,Other,NA
+R_6zLJwWAYGtZEKu5,I have used tidymodels packages a few times,Q5_1,80,Survival analysis,NA
+R_6zLJwWAYGtZEKu5,I have used tidymodels packages a few times,Q5_2,0,Support for sparse data structures,NA
+R_6zLJwWAYGtZEKu5,I have used tidymodels packages a few times,Q5_3,0,Adaptive resampling and better parallelization,NA
+R_6zLJwWAYGtZEKu5,I have used tidymodels packages a few times,Q5_4,20,"Model monitoring, updating, & organization",NA
+R_6zLJwWAYGtZEKu5,I have used tidymodels packages a few times,Q5_5,0,Translate prediction equations,NA
+R_6zLJwWAYGtZEKu5,I have used tidymodels packages a few times,Q5_6,0,Model stacking ,NA
+R_6zLJwWAYGtZEKu5,I have used tidymodels packages a few times,Q5_8,0,Post-processing in workflow(),NA
+R_6zLJwWAYGtZEKu5,I have used tidymodels packages a few times,Q5_9,0,Ignore recipe steps,NA
+R_6zLJwWAYGtZEKu5,I have used tidymodels packages a few times,Q5_10,0,H2O.ai support ,NA
+R_6zLJwWAYGtZEKu5,I have used tidymodels packages a few times,Q5_12,0,Other,NA
+R_3PvKetlP1E9uLGg,I have used tidymodels packages a few times,Q5_1,0,Survival analysis,NA
+R_3PvKetlP1E9uLGg,I have used tidymodels packages a few times,Q5_2,0,Support for sparse data structures,NA
+R_3PvKetlP1E9uLGg,I have used tidymodels packages a few times,Q5_3,30,Adaptive resampling and better parallelization,NA
+R_3PvKetlP1E9uLGg,I have used tidymodels packages a few times,Q5_4,20,"Model monitoring, updating, & organization",NA
+R_3PvKetlP1E9uLGg,I have used tidymodels packages a few times,Q5_5,0,Translate prediction equations,NA
+R_3PvKetlP1E9uLGg,I have used tidymodels packages a few times,Q5_6,20,Model stacking ,NA
+R_3PvKetlP1E9uLGg,I have used tidymodels packages a few times,Q5_8,10,Post-processing in workflow(),NA
+R_3PvKetlP1E9uLGg,I have used tidymodels packages a few times,Q5_9,0,Ignore recipe steps,NA
+R_3PvKetlP1E9uLGg,I have used tidymodels packages a few times,Q5_10,20,H2O.ai support ,NA
+R_3PvKetlP1E9uLGg,I have used tidymodels packages a few times,Q5_12,0,Other,NA
+R_2Vf08ZxQtJekl5U,I have used tidymodels packages a few times,Q5_1,0,Survival analysis,NA
+R_2Vf08ZxQtJekl5U,I have used tidymodels packages a few times,Q5_2,0,Support for sparse data structures,NA
+R_2Vf08ZxQtJekl5U,I have used tidymodels packages a few times,Q5_3,20,Adaptive resampling and better parallelization,NA
+R_2Vf08ZxQtJekl5U,I have used tidymodels packages a few times,Q5_4,20,"Model monitoring, updating, & organization",NA
+R_2Vf08ZxQtJekl5U,I have used tidymodels packages a few times,Q5_5,5,Translate prediction equations,NA
+R_2Vf08ZxQtJekl5U,I have used tidymodels packages a few times,Q5_6,20,Model stacking ,NA
+R_2Vf08ZxQtJekl5U,I have used tidymodels packages a few times,Q5_8,10,Post-processing in workflow(),NA
+R_2Vf08ZxQtJekl5U,I have used tidymodels packages a few times,Q5_9,5,Ignore recipe steps,NA
+R_2Vf08ZxQtJekl5U,I have used tidymodels packages a few times,Q5_10,20,H2O.ai support ,NA
+R_2Vf08ZxQtJekl5U,I have used tidymodels packages a few times,Q5_12,0,Other,NA
+R_3e8IdKlRLJNdQ4m,I have used tidymodels packages a few times,Q5_1,15,Survival analysis,NA
+R_3e8IdKlRLJNdQ4m,I have used tidymodels packages a few times,Q5_2,10,Support for sparse data structures,NA
+R_3e8IdKlRLJNdQ4m,I have used tidymodels packages a few times,Q5_3,10,Adaptive resampling and better parallelization,NA
+R_3e8IdKlRLJNdQ4m,I have used tidymodels packages a few times,Q5_4,5,"Model monitoring, updating, & organization",NA
+R_3e8IdKlRLJNdQ4m,I have used tidymodels packages a few times,Q5_5,50,Translate prediction equations,NA
+R_3e8IdKlRLJNdQ4m,I have used tidymodels packages a few times,Q5_6,0,Model stacking ,NA
+R_3e8IdKlRLJNdQ4m,I have used tidymodels packages a few times,Q5_8,5,Post-processing in workflow(),NA
+R_3e8IdKlRLJNdQ4m,I have used tidymodels packages a few times,Q5_9,5,Ignore recipe steps,NA
+R_3e8IdKlRLJNdQ4m,I have used tidymodels packages a few times,Q5_10,0,H2O.ai support ,NA
+R_3e8IdKlRLJNdQ4m,I have used tidymodels packages a few times,Q5_12,0,Other,NA
+R_3PttgPDmmuNazbm,I have used tidymodels packages a few times,Q5_1,0,Survival analysis,NA
+R_3PttgPDmmuNazbm,I have used tidymodels packages a few times,Q5_2,10,Support for sparse data structures,NA
+R_3PttgPDmmuNazbm,I have used tidymodels packages a few times,Q5_3,20,Adaptive resampling and better parallelization,NA
+R_3PttgPDmmuNazbm,I have used tidymodels packages a few times,Q5_4,10,"Model monitoring, updating, & organization",NA
+R_3PttgPDmmuNazbm,I have used tidymodels packages a few times,Q5_5,0,Translate prediction equations,NA
+R_3PttgPDmmuNazbm,I have used tidymodels packages a few times,Q5_6,25,Model stacking ,NA
+R_3PttgPDmmuNazbm,I have used tidymodels packages a few times,Q5_8,25,Post-processing in workflow(),NA
+R_3PttgPDmmuNazbm,I have used tidymodels packages a few times,Q5_9,0,Ignore recipe steps,NA
+R_3PttgPDmmuNazbm,I have used tidymodels packages a few times,Q5_10,10,H2O.ai support ,NA
+R_3PttgPDmmuNazbm,I have used tidymodels packages a few times,Q5_12,0,Other,NA
+R_3eNoj9FbxSW42Rj,I have never used tidymodels,Q5_1,5,Survival analysis,NA
+R_3eNoj9FbxSW42Rj,I have never used tidymodels,Q5_2,0,Support for sparse data structures,NA
+R_3eNoj9FbxSW42Rj,I have never used tidymodels,Q5_3,0,Adaptive resampling and better parallelization,NA
+R_3eNoj9FbxSW42Rj,I have never used tidymodels,Q5_4,30,"Model monitoring, updating, & organization",NA
+R_3eNoj9FbxSW42Rj,I have never used tidymodels,Q5_5,40,Translate prediction equations,NA
+R_3eNoj9FbxSW42Rj,I have never used tidymodels,Q5_6,5,Model stacking ,NA
+R_3eNoj9FbxSW42Rj,I have never used tidymodels,Q5_8,20,Post-processing in workflow(),NA
+R_3eNoj9FbxSW42Rj,I have never used tidymodels,Q5_9,0,Ignore recipe steps,NA
+R_3eNoj9FbxSW42Rj,I have never used tidymodels,Q5_10,0,H2O.ai support ,NA
+R_3eNoj9FbxSW42Rj,I have never used tidymodels,Q5_12,0,Other,NA
+R_3jYUwD0Dkyg91lJ,I have contributed to tidymodels packages or taught others how to use them,Q5_1,0,Survival analysis,NA
+R_3jYUwD0Dkyg91lJ,I have contributed to tidymodels packages or taught others how to use them,Q5_2,0,Support for sparse data structures,NA
+R_3jYUwD0Dkyg91lJ,I have contributed to tidymodels packages or taught others how to use them,Q5_3,10,Adaptive resampling and better parallelization,NA
+R_3jYUwD0Dkyg91lJ,I have contributed to tidymodels packages or taught others how to use them,Q5_4,80,"Model monitoring, updating, & organization",NA
+R_3jYUwD0Dkyg91lJ,I have contributed to tidymodels packages or taught others how to use them,Q5_5,0,Translate prediction equations,NA
+R_3jYUwD0Dkyg91lJ,I have contributed to tidymodels packages or taught others how to use them,Q5_6,5,Model stacking ,NA
+R_3jYUwD0Dkyg91lJ,I have contributed to tidymodels packages or taught others how to use them,Q5_8,5,Post-processing in workflow(),NA
+R_3jYUwD0Dkyg91lJ,I have contributed to tidymodels packages or taught others how to use them,Q5_9,0,Ignore recipe steps,NA
+R_3jYUwD0Dkyg91lJ,I have contributed to tidymodels packages or taught others how to use them,Q5_10,0,H2O.ai support ,NA
+R_3jYUwD0Dkyg91lJ,I have contributed to tidymodels packages or taught others how to use them,Q5_12,0,Other,NA
+R_BMre7xrTFNShdrX,I have used tidymodels packages many times,Q5_1,15,Survival analysis,NA
+R_BMre7xrTFNShdrX,I have used tidymodels packages many times,Q5_2,0,Support for sparse data structures,NA
+R_BMre7xrTFNShdrX,I have used tidymodels packages many times,Q5_3,20,Adaptive resampling and better parallelization,NA
+R_BMre7xrTFNShdrX,I have used tidymodels packages many times,Q5_4,0,"Model monitoring, updating, & organization",NA
+R_BMre7xrTFNShdrX,I have used tidymodels packages many times,Q5_5,30,Translate prediction equations,NA
+R_BMre7xrTFNShdrX,I have used tidymodels packages many times,Q5_6,15,Model stacking ,NA
+R_BMre7xrTFNShdrX,I have used tidymodels packages many times,Q5_8,20,Post-processing in workflow(),NA
+R_BMre7xrTFNShdrX,I have used tidymodels packages many times,Q5_9,0,Ignore recipe steps,NA
+R_BMre7xrTFNShdrX,I have used tidymodels packages many times,Q5_10,0,H2O.ai support ,NA
+R_BMre7xrTFNShdrX,I have used tidymodels packages many times,Q5_12,0,Other,NA
+R_30obELksMaBsirJ,I have used tidymodels packages a few times,Q5_1,100,Survival analysis,NA
+R_30obELksMaBsirJ,I have used tidymodels packages a few times,Q5_2,0,Support for sparse data structures,NA
+R_30obELksMaBsirJ,I have used tidymodels packages a few times,Q5_3,0,Adaptive resampling and better parallelization,NA
+R_30obELksMaBsirJ,I have used tidymodels packages a few times,Q5_4,0,"Model monitoring, updating, & organization",NA
+R_30obELksMaBsirJ,I have used tidymodels packages a few times,Q5_5,0,Translate prediction equations,NA
+R_30obELksMaBsirJ,I have used tidymodels packages a few times,Q5_6,0,Model stacking ,NA
+R_30obELksMaBsirJ,I have used tidymodels packages a few times,Q5_8,0,Post-processing in workflow(),NA
+R_30obELksMaBsirJ,I have used tidymodels packages a few times,Q5_9,0,Ignore recipe steps,NA
+R_30obELksMaBsirJ,I have used tidymodels packages a few times,Q5_10,0,H2O.ai support ,NA
+R_30obELksMaBsirJ,I have used tidymodels packages a few times,Q5_12,0,Other,NA
+R_1j7juZcqbk69Zr6,I have used tidymodels packages a few times,Q5_1,0,Survival analysis,NA
+R_1j7juZcqbk69Zr6,I have used tidymodels packages a few times,Q5_2,0,Support for sparse data structures,NA
+R_1j7juZcqbk69Zr6,I have used tidymodels packages a few times,Q5_3,0,Adaptive resampling and better parallelization,NA
+R_1j7juZcqbk69Zr6,I have used tidymodels packages a few times,Q5_4,0,"Model monitoring, updating, & organization",NA
+R_1j7juZcqbk69Zr6,I have used tidymodels packages a few times,Q5_5,0,Translate prediction equations,NA
+R_1j7juZcqbk69Zr6,I have used tidymodels packages a few times,Q5_6,70,Model stacking ,NA
+R_1j7juZcqbk69Zr6,I have used tidymodels packages a few times,Q5_8,0,Post-processing in workflow(),NA
+R_1j7juZcqbk69Zr6,I have used tidymodels packages a few times,Q5_9,30,Ignore recipe steps,NA
+R_1j7juZcqbk69Zr6,I have used tidymodels packages a few times,Q5_10,0,H2O.ai support ,NA
+R_1j7juZcqbk69Zr6,I have used tidymodels packages a few times,Q5_12,0,Other,NA
+R_3GvNbWi6SRwSPKf,I have never used tidymodels,Q5_1,5,Survival analysis,NA
+R_3GvNbWi6SRwSPKf,I have never used tidymodels,Q5_2,5,Support for sparse data structures,NA
+R_3GvNbWi6SRwSPKf,I have never used tidymodels,Q5_3,25,Adaptive resampling and better parallelization,NA
+R_3GvNbWi6SRwSPKf,I have never used tidymodels,Q5_4,25,"Model monitoring, updating, & organization",NA
+R_3GvNbWi6SRwSPKf,I have never used tidymodels,Q5_5,5,Translate prediction equations,NA
+R_3GvNbWi6SRwSPKf,I have never used tidymodels,Q5_6,5,Model stacking ,NA
+R_3GvNbWi6SRwSPKf,I have never used tidymodels,Q5_8,15,Post-processing in workflow(),NA
+R_3GvNbWi6SRwSPKf,I have never used tidymodels,Q5_9,5,Ignore recipe steps,NA
+R_3GvNbWi6SRwSPKf,I have never used tidymodels,Q5_10,5,H2O.ai support ,NA
+R_3GvNbWi6SRwSPKf,I have never used tidymodels,Q5_12,5,Other,NA
+R_1rfd7euRgtyWMjo,I have used tidymodels packages a few times,Q5_1,0,Survival analysis,NA
+R_1rfd7euRgtyWMjo,I have used tidymodels packages a few times,Q5_2,0,Support for sparse data structures,NA
+R_1rfd7euRgtyWMjo,I have used tidymodels packages a few times,Q5_3,0,Adaptive resampling and better parallelization,NA
+R_1rfd7euRgtyWMjo,I have used tidymodels packages a few times,Q5_4,0,"Model monitoring, updating, & organization",NA
+R_1rfd7euRgtyWMjo,I have used tidymodels packages a few times,Q5_5,50,Translate prediction equations,NA
+R_1rfd7euRgtyWMjo,I have used tidymodels packages a few times,Q5_6,50,Model stacking ,NA
+R_1rfd7euRgtyWMjo,I have used tidymodels packages a few times,Q5_8,0,Post-processing in workflow(),NA
+R_1rfd7euRgtyWMjo,I have used tidymodels packages a few times,Q5_9,0,Ignore recipe steps,NA
+R_1rfd7euRgtyWMjo,I have used tidymodels packages a few times,Q5_10,0,H2O.ai support ,NA
+R_1rfd7euRgtyWMjo,I have used tidymodels packages a few times,Q5_12,0,Other,NA
+R_3s1ATqqYBKEsIjf,I have never used tidymodels,Q5_1,0,Survival analysis,NA
+R_3s1ATqqYBKEsIjf,I have never used tidymodels,Q5_2,0,Support for sparse data structures,NA
+R_3s1ATqqYBKEsIjf,I have never used tidymodels,Q5_3,20,Adaptive resampling and better parallelization,NA
+R_3s1ATqqYBKEsIjf,I have never used tidymodels,Q5_4,40,"Model monitoring, updating, & organization",NA
+R_3s1ATqqYBKEsIjf,I have never used tidymodels,Q5_5,40,Translate prediction equations,NA
+R_3s1ATqqYBKEsIjf,I have never used tidymodels,Q5_6,0,Model stacking ,NA
+R_3s1ATqqYBKEsIjf,I have never used tidymodels,Q5_8,0,Post-processing in workflow(),NA
+R_3s1ATqqYBKEsIjf,I have never used tidymodels,Q5_9,0,Ignore recipe steps,NA
+R_3s1ATqqYBKEsIjf,I have never used tidymodels,Q5_10,0,H2O.ai support ,NA
+R_3s1ATqqYBKEsIjf,I have never used tidymodels,Q5_12,0,Other,NA
+R_OJaSY45yieG3MXv,I have used tidymodels packages a few times,Q5_1,5,Survival analysis,NA
+R_OJaSY45yieG3MXv,I have used tidymodels packages a few times,Q5_2,0,Support for sparse data structures,NA
+R_OJaSY45yieG3MXv,I have used tidymodels packages a few times,Q5_3,25,Adaptive resampling and better parallelization,NA
+R_OJaSY45yieG3MXv,I have used tidymodels packages a few times,Q5_4,25,"Model monitoring, updating, & organization",NA
+R_OJaSY45yieG3MXv,I have used tidymodels packages a few times,Q5_5,5,Translate prediction equations,NA
+R_OJaSY45yieG3MXv,I have used tidymodels packages a few times,Q5_6,25,Model stacking ,NA
+R_OJaSY45yieG3MXv,I have used tidymodels packages a few times,Q5_8,5,Post-processing in workflow(),NA
+R_OJaSY45yieG3MXv,I have used tidymodels packages a few times,Q5_9,0,Ignore recipe steps,NA
+R_OJaSY45yieG3MXv,I have used tidymodels packages a few times,Q5_10,10,H2O.ai support ,NA
+R_OJaSY45yieG3MXv,I have used tidymodels packages a few times,Q5_12,0,Other,NA
+R_2v0UwaE4xBKxLBC,I have never used tidymodels,Q5_1,5,Survival analysis,NA
+R_2v0UwaE4xBKxLBC,I have never used tidymodels,Q5_2,20,Support for sparse data structures,NA
+R_2v0UwaE4xBKxLBC,I have never used tidymodels,Q5_3,10,Adaptive resampling and better parallelization,NA
+R_2v0UwaE4xBKxLBC,I have never used tidymodels,Q5_4,20,"Model monitoring, updating, & organization",NA
+R_2v0UwaE4xBKxLBC,I have never used tidymodels,Q5_5,10,Translate prediction equations,NA
+R_2v0UwaE4xBKxLBC,I have never used tidymodels,Q5_6,20,Model stacking ,NA
+R_2v0UwaE4xBKxLBC,I have never used tidymodels,Q5_8,10,Post-processing in workflow(),NA
+R_2v0UwaE4xBKxLBC,I have never used tidymodels,Q5_9,5,Ignore recipe steps,NA
+R_2v0UwaE4xBKxLBC,I have never used tidymodels,Q5_10,0,H2O.ai support ,NA
+R_2v0UwaE4xBKxLBC,I have never used tidymodels,Q5_12,0,Other,NA
+R_1HqLRvQIDmJDwBg,I have used tidymodels packages a few times,Q5_1,25,Survival analysis,NA
+R_1HqLRvQIDmJDwBg,I have used tidymodels packages a few times,Q5_2,0,Support for sparse data structures,NA
+R_1HqLRvQIDmJDwBg,I have used tidymodels packages a few times,Q5_3,10,Adaptive resampling and better parallelization,NA
+R_1HqLRvQIDmJDwBg,I have used tidymodels packages a few times,Q5_4,25,"Model monitoring, updating, & organization",NA
+R_1HqLRvQIDmJDwBg,I have used tidymodels packages a few times,Q5_5,0,Translate prediction equations,NA
+R_1HqLRvQIDmJDwBg,I have used tidymodels packages a few times,Q5_6,15,Model stacking ,NA
+R_1HqLRvQIDmJDwBg,I have used tidymodels packages a few times,Q5_8,25,Post-processing in workflow(),NA
+R_1HqLRvQIDmJDwBg,I have used tidymodels packages a few times,Q5_9,0,Ignore recipe steps,NA
+R_1HqLRvQIDmJDwBg,I have used tidymodels packages a few times,Q5_10,0,H2O.ai support ,NA
+R_1HqLRvQIDmJDwBg,I have used tidymodels packages a few times,Q5_12,0,Other,NA
+R_2pLxO5U0nVTsjEb,I have used tidymodels packages a few times,Q5_1,10,Survival analysis,NA
+R_2pLxO5U0nVTsjEb,I have used tidymodels packages a few times,Q5_2,5,Support for sparse data structures,NA
+R_2pLxO5U0nVTsjEb,I have used tidymodels packages a few times,Q5_3,5,Adaptive resampling and better parallelization,NA
+R_2pLxO5U0nVTsjEb,I have used tidymodels packages a few times,Q5_4,30,"Model monitoring, updating, & organization",NA
+R_2pLxO5U0nVTsjEb,I have used tidymodels packages a few times,Q5_5,10,Translate prediction equations,NA
+R_2pLxO5U0nVTsjEb,I have used tidymodels packages a few times,Q5_6,15,Model stacking ,NA
+R_2pLxO5U0nVTsjEb,I have used tidymodels packages a few times,Q5_8,10,Post-processing in workflow(),NA
+R_2pLxO5U0nVTsjEb,I have used tidymodels packages a few times,Q5_9,5,Ignore recipe steps,NA
+R_2pLxO5U0nVTsjEb,I have used tidymodels packages a few times,Q5_10,0,H2O.ai support ,NA
+R_2pLxO5U0nVTsjEb,I have used tidymodels packages a few times,Q5_12,10,Other,Improved documentation
+R_23VIISsDVuKbL1F,I have used tidymodels packages a few times,Q5_1,0,Survival analysis,NA
+R_23VIISsDVuKbL1F,I have used tidymodels packages a few times,Q5_2,30,Support for sparse data structures,NA
+R_23VIISsDVuKbL1F,I have used tidymodels packages a few times,Q5_3,20,Adaptive resampling and better parallelization,NA
+R_23VIISsDVuKbL1F,I have used tidymodels packages a few times,Q5_4,10,"Model monitoring, updating, & organization",NA
+R_23VIISsDVuKbL1F,I have used tidymodels packages a few times,Q5_5,1,Translate prediction equations,NA
+R_23VIISsDVuKbL1F,I have used tidymodels packages a few times,Q5_6,10,Model stacking ,NA
+R_23VIISsDVuKbL1F,I have used tidymodels packages a few times,Q5_8,10,Post-processing in workflow(),NA
+R_23VIISsDVuKbL1F,I have used tidymodels packages a few times,Q5_9,10,Ignore recipe steps,NA
+R_23VIISsDVuKbL1F,I have used tidymodels packages a few times,Q5_10,0,H2O.ai support ,NA
+R_23VIISsDVuKbL1F,I have used tidymodels packages a few times,Q5_12,9,Other,lasso
+R_2UeVJIkKQpTJgzG,I have used tidymodels packages many times,Q5_1,33,Survival analysis,NA
+R_2UeVJIkKQpTJgzG,I have used tidymodels packages many times,Q5_2,0,Support for sparse data structures,NA
+R_2UeVJIkKQpTJgzG,I have used tidymodels packages many times,Q5_3,33,Adaptive resampling and better parallelization,NA
+R_2UeVJIkKQpTJgzG,I have used tidymodels packages many times,Q5_4,33,"Model monitoring, updating, & organization",NA
+R_2UeVJIkKQpTJgzG,I have used tidymodels packages many times,Q5_5,0,Translate prediction equations,NA
+R_2UeVJIkKQpTJgzG,I have used tidymodels packages many times,Q5_6,1,Model stacking ,NA
+R_2UeVJIkKQpTJgzG,I have used tidymodels packages many times,Q5_8,0,Post-processing in workflow(),NA
+R_2UeVJIkKQpTJgzG,I have used tidymodels packages many times,Q5_9,0,Ignore recipe steps,NA
+R_2UeVJIkKQpTJgzG,I have used tidymodels packages many times,Q5_10,0,H2O.ai support ,NA
+R_2UeVJIkKQpTJgzG,I have used tidymodels packages many times,Q5_12,0,Other,NA
+R_1IhGUFdkvbQAyZL,I have used tidymodels packages many times,Q5_1,10,Survival analysis,NA
+R_1IhGUFdkvbQAyZL,I have used tidymodels packages many times,Q5_2,10,Support for sparse data structures,NA
+R_1IhGUFdkvbQAyZL,I have used tidymodels packages many times,Q5_3,10,Adaptive resampling and better parallelization,NA
+R_1IhGUFdkvbQAyZL,I have used tidymodels packages many times,Q5_4,20,"Model monitoring, updating, & organization",NA
+R_1IhGUFdkvbQAyZL,I have used tidymodels packages many times,Q5_5,0,Translate prediction equations,NA
+R_1IhGUFdkvbQAyZL,I have used tidymodels packages many times,Q5_6,15,Model stacking ,NA
+R_1IhGUFdkvbQAyZL,I have used tidymodels packages many times,Q5_8,20,Post-processing in workflow(),NA
+R_1IhGUFdkvbQAyZL,I have used tidymodels packages many times,Q5_9,0,Ignore recipe steps,NA
+R_1IhGUFdkvbQAyZL,I have used tidymodels packages many times,Q5_10,15,H2O.ai support ,NA
+R_1IhGUFdkvbQAyZL,I have used tidymodels packages many times,Q5_12,0,Other,NA
+R_pLdwGfZwmCQiF5D,I have never used tidymodels,Q5_1,10,Survival analysis,NA
+R_pLdwGfZwmCQiF5D,I have never used tidymodels,Q5_2,10,Support for sparse data structures,NA
+R_pLdwGfZwmCQiF5D,I have never used tidymodels,Q5_3,10,Adaptive resampling and better parallelization,NA
+R_pLdwGfZwmCQiF5D,I have never used tidymodels,Q5_4,10,"Model monitoring, updating, & organization",NA
+R_pLdwGfZwmCQiF5D,I have never used tidymodels,Q5_5,5,Translate prediction equations,NA
+R_pLdwGfZwmCQiF5D,I have never used tidymodels,Q5_6,40,Model stacking ,NA
+R_pLdwGfZwmCQiF5D,I have never used tidymodels,Q5_8,5,Post-processing in workflow(),NA
+R_pLdwGfZwmCQiF5D,I have never used tidymodels,Q5_9,10,Ignore recipe steps,NA
+R_pLdwGfZwmCQiF5D,I have never used tidymodels,Q5_10,0,H2O.ai support ,NA
+R_pLdwGfZwmCQiF5D,I have never used tidymodels,Q5_12,0,Other,NA
+R_2y4rLW85t8DF9Hs,I have used tidymodels packages a few times,Q5_1,0,Survival analysis,NA
+R_2y4rLW85t8DF9Hs,I have used tidymodels packages a few times,Q5_2,10,Support for sparse data structures,NA
+R_2y4rLW85t8DF9Hs,I have used tidymodels packages a few times,Q5_3,0,Adaptive resampling and better parallelization,NA
+R_2y4rLW85t8DF9Hs,I have used tidymodels packages a few times,Q5_4,75,"Model monitoring, updating, & organization",NA
+R_2y4rLW85t8DF9Hs,I have used tidymodels packages a few times,Q5_5,0,Translate prediction equations,NA
+R_2y4rLW85t8DF9Hs,I have used tidymodels packages a few times,Q5_6,0,Model stacking ,NA
+R_2y4rLW85t8DF9Hs,I have used tidymodels packages a few times,Q5_8,15,Post-processing in workflow(),NA
+R_2y4rLW85t8DF9Hs,I have used tidymodels packages a few times,Q5_9,0,Ignore recipe steps,NA
+R_2y4rLW85t8DF9Hs,I have used tidymodels packages a few times,Q5_10,0,H2O.ai support ,NA
+R_2y4rLW85t8DF9Hs,I have used tidymodels packages a few times,Q5_12,0,Other,NA
+R_2zMUFuZdjG8DovK,I have used tidymodels packages many times,Q5_1,0,Survival analysis,NA
+R_2zMUFuZdjG8DovK,I have used tidymodels packages many times,Q5_2,0,Support for sparse data structures,NA
+R_2zMUFuZdjG8DovK,I have used tidymodels packages many times,Q5_3,40,Adaptive resampling and better parallelization,NA
+R_2zMUFuZdjG8DovK,I have used tidymodels packages many times,Q5_4,0,"Model monitoring, updating, & organization",NA
+R_2zMUFuZdjG8DovK,I have used tidymodels packages many times,Q5_5,0,Translate prediction equations,NA
+R_2zMUFuZdjG8DovK,I have used tidymodels packages many times,Q5_6,10,Model stacking ,NA
+R_2zMUFuZdjG8DovK,I have used tidymodels packages many times,Q5_8,10,Post-processing in workflow(),NA
+R_2zMUFuZdjG8DovK,I have used tidymodels packages many times,Q5_9,40,Ignore recipe steps,NA
+R_2zMUFuZdjG8DovK,I have used tidymodels packages many times,Q5_10,0,H2O.ai support ,NA
+R_2zMUFuZdjG8DovK,I have used tidymodels packages many times,Q5_12,0,Other,NA
+R_24oBRhPX5X3XUY6,I have used tidymodels packages a few times,Q5_1,10,Survival analysis,NA
+R_24oBRhPX5X3XUY6,I have used tidymodels packages a few times,Q5_2,25,Support for sparse data structures,NA
+R_24oBRhPX5X3XUY6,I have used tidymodels packages a few times,Q5_3,15,Adaptive resampling and better parallelization,NA
+R_24oBRhPX5X3XUY6,I have used tidymodels packages a few times,Q5_4,0,"Model monitoring, updating, & organization",NA
+R_24oBRhPX5X3XUY6,I have used tidymodels packages a few times,Q5_5,25,Translate prediction equations,NA
+R_24oBRhPX5X3XUY6,I have used tidymodels packages a few times,Q5_6,0,Model stacking ,NA
+R_24oBRhPX5X3XUY6,I have used tidymodels packages a few times,Q5_8,0,Post-processing in workflow(),NA
+R_24oBRhPX5X3XUY6,I have used tidymodels packages a few times,Q5_9,25,Ignore recipe steps,NA
+R_24oBRhPX5X3XUY6,I have used tidymodels packages a few times,Q5_10,0,H2O.ai support ,NA
+R_24oBRhPX5X3XUY6,I have used tidymodels packages a few times,Q5_12,0,Other,NA
+R_3Dw1lkcFleMsgAv,I have used tidymodels packages a few times,Q5_1,0,Survival analysis,NA
+R_3Dw1lkcFleMsgAv,I have used tidymodels packages a few times,Q5_2,0,Support for sparse data structures,NA
+R_3Dw1lkcFleMsgAv,I have used tidymodels packages a few times,Q5_3,0,Adaptive resampling and better parallelization,NA
+R_3Dw1lkcFleMsgAv,I have used tidymodels packages a few times,Q5_4,0,"Model monitoring, updating, & organization",NA
+R_3Dw1lkcFleMsgAv,I have used tidymodels packages a few times,Q5_5,0,Translate prediction equations,NA
+R_3Dw1lkcFleMsgAv,I have used tidymodels packages a few times,Q5_6,50,Model stacking ,NA
+R_3Dw1lkcFleMsgAv,I have used tidymodels packages a few times,Q5_8,50,Post-processing in workflow(),NA
+R_3Dw1lkcFleMsgAv,I have used tidymodels packages a few times,Q5_9,0,Ignore recipe steps,NA
+R_3Dw1lkcFleMsgAv,I have used tidymodels packages a few times,Q5_10,0,H2O.ai support ,NA
+R_3Dw1lkcFleMsgAv,I have used tidymodels packages a few times,Q5_12,0,Other,NA
+R_1pVwA0giKgYKh3v,I have used tidymodels packages a few times,Q5_1,0,Survival analysis,NA
+R_1pVwA0giKgYKh3v,I have used tidymodels packages a few times,Q5_2,0,Support for sparse data structures,NA
+R_1pVwA0giKgYKh3v,I have used tidymodels packages a few times,Q5_3,0,Adaptive resampling and better parallelization,NA
+R_1pVwA0giKgYKh3v,I have used tidymodels packages a few times,Q5_4,0,"Model monitoring, updating, & organization",NA
+R_1pVwA0giKgYKh3v,I have used tidymodels packages a few times,Q5_5,0,Translate prediction equations,NA
+R_1pVwA0giKgYKh3v,I have used tidymodels packages a few times,Q5_6,75,Model stacking ,NA
+R_1pVwA0giKgYKh3v,I have used tidymodels packages a few times,Q5_8,0,Post-processing in workflow(),NA
+R_1pVwA0giKgYKh3v,I have used tidymodels packages a few times,Q5_9,0,Ignore recipe steps,NA
+R_1pVwA0giKgYKh3v,I have used tidymodels packages a few times,Q5_10,25,H2O.ai support ,NA
+R_1pVwA0giKgYKh3v,I have used tidymodels packages a few times,Q5_12,0,Other,NA
+R_yVneGpGGSh6b2x3,I have used tidymodels packages a few times,Q5_1,0,Survival analysis,NA
+R_yVneGpGGSh6b2x3,I have used tidymodels packages a few times,Q5_2,0,Support for sparse data structures,NA
+R_yVneGpGGSh6b2x3,I have used tidymodels packages a few times,Q5_3,0,Adaptive resampling and better parallelization,NA
+R_yVneGpGGSh6b2x3,I have used tidymodels packages a few times,Q5_4,30,"Model monitoring, updating, & organization",NA
+R_yVneGpGGSh6b2x3,I have used tidymodels packages a few times,Q5_5,0,Translate prediction equations,NA
+R_yVneGpGGSh6b2x3,I have used tidymodels packages a few times,Q5_6,30,Model stacking ,NA
+R_yVneGpGGSh6b2x3,I have used tidymodels packages a few times,Q5_8,0,Post-processing in workflow(),NA
+R_yVneGpGGSh6b2x3,I have used tidymodels packages a few times,Q5_9,20,Ignore recipe steps,NA
+R_yVneGpGGSh6b2x3,I have used tidymodels packages a few times,Q5_10,0,H2O.ai support ,NA
+R_yVneGpGGSh6b2x3,I have used tidymodels packages a few times,Q5_12,20,Other,NA
+R_DzZak23mgr6KCSR,I have used tidymodels packages a few times,Q5_1,15,Survival analysis,NA
+R_DzZak23mgr6KCSR,I have used tidymodels packages a few times,Q5_2,13,Support for sparse data structures,NA
+R_DzZak23mgr6KCSR,I have used tidymodels packages a few times,Q5_3,15,Adaptive resampling and better parallelization,NA
+R_DzZak23mgr6KCSR,I have used tidymodels packages a few times,Q5_4,15,"Model monitoring, updating, & organization",NA
+R_DzZak23mgr6KCSR,I have used tidymodels packages a few times,Q5_5,0,Translate prediction equations,NA
+R_DzZak23mgr6KCSR,I have used tidymodels packages a few times,Q5_6,30,Model stacking ,NA
+R_DzZak23mgr6KCSR,I have used tidymodels packages a few times,Q5_8,12,Post-processing in workflow(),NA
+R_DzZak23mgr6KCSR,I have used tidymodels packages a few times,Q5_9,0,Ignore recipe steps,NA
+R_DzZak23mgr6KCSR,I have used tidymodels packages a few times,Q5_10,0,H2O.ai support ,NA
+R_DzZak23mgr6KCSR,I have used tidymodels packages a few times,Q5_12,0,Other,NA
+R_3KNNeBzOIKGMEBf,I have used tidymodels packages a few times,Q5_1,10,Survival analysis,NA
+R_3KNNeBzOIKGMEBf,I have used tidymodels packages a few times,Q5_2,0,Support for sparse data structures,NA
+R_3KNNeBzOIKGMEBf,I have used tidymodels packages a few times,Q5_3,20,Adaptive resampling and better parallelization,NA
+R_3KNNeBzOIKGMEBf,I have used tidymodels packages a few times,Q5_4,10,"Model monitoring, updating, & organization",NA
+R_3KNNeBzOIKGMEBf,I have used tidymodels packages a few times,Q5_5,0,Translate prediction equations,NA
+R_3KNNeBzOIKGMEBf,I have used tidymodels packages a few times,Q5_6,30,Model stacking ,NA
+R_3KNNeBzOIKGMEBf,I have used tidymodels packages a few times,Q5_8,10,Post-processing in workflow(),NA
+R_3KNNeBzOIKGMEBf,I have used tidymodels packages a few times,Q5_9,0,Ignore recipe steps,NA
+R_3KNNeBzOIKGMEBf,I have used tidymodels packages a few times,Q5_10,20,H2O.ai support ,NA
+R_3KNNeBzOIKGMEBf,I have used tidymodels packages a few times,Q5_12,0,Other,NA
+R_1qVub4hwqdwS213,I have used tidymodels packages a few times,Q5_1,0,Survival analysis,NA
+R_1qVub4hwqdwS213,I have used tidymodels packages a few times,Q5_2,0,Support for sparse data structures,NA
+R_1qVub4hwqdwS213,I have used tidymodels packages a few times,Q5_3,15,Adaptive resampling and better parallelization,NA
+R_1qVub4hwqdwS213,I have used tidymodels packages a few times,Q5_4,10,"Model monitoring, updating, & organization",NA
+R_1qVub4hwqdwS213,I have used tidymodels packages a few times,Q5_5,5,Translate prediction equations,NA
+R_1qVub4hwqdwS213,I have used tidymodels packages a few times,Q5_6,15,Model stacking ,NA
+R_1qVub4hwqdwS213,I have used tidymodels packages a few times,Q5_8,15,Post-processing in workflow(),NA
+R_1qVub4hwqdwS213,I have used tidymodels packages a few times,Q5_9,15,Ignore recipe steps,NA
+R_1qVub4hwqdwS213,I have used tidymodels packages a few times,Q5_10,25,H2O.ai support ,NA
+R_1qVub4hwqdwS213,I have used tidymodels packages a few times,Q5_12,0,Other,NA
+R_2sbu1g9YeBrpH3X,I have used tidymodels packages a few times,Q5_1,0,Survival analysis,NA
+R_2sbu1g9YeBrpH3X,I have used tidymodels packages a few times,Q5_2,0,Support for sparse data structures,NA
+R_2sbu1g9YeBrpH3X,I have used tidymodels packages a few times,Q5_3,10,Adaptive resampling and better parallelization,NA
+R_2sbu1g9YeBrpH3X,I have used tidymodels packages a few times,Q5_4,5,"Model monitoring, updating, & organization",NA
+R_2sbu1g9YeBrpH3X,I have used tidymodels packages a few times,Q5_5,50,Translate prediction equations,NA
+R_2sbu1g9YeBrpH3X,I have used tidymodels packages a few times,Q5_6,20,Model stacking ,NA
+R_2sbu1g9YeBrpH3X,I have used tidymodels packages a few times,Q5_8,10,Post-processing in workflow(),NA
+R_2sbu1g9YeBrpH3X,I have used tidymodels packages a few times,Q5_9,0,Ignore recipe steps,NA
+R_2sbu1g9YeBrpH3X,I have used tidymodels packages a few times,Q5_10,5,H2O.ai support ,NA
+R_2sbu1g9YeBrpH3X,I have used tidymodels packages a few times,Q5_12,0,Other,NA
+R_pu6ucDjf0FQv4E9,I have used tidymodels packages a few times,Q5_1,20,Survival analysis,NA
+R_pu6ucDjf0FQv4E9,I have used tidymodels packages a few times,Q5_2,30,Support for sparse data structures,NA
+R_pu6ucDjf0FQv4E9,I have used tidymodels packages a few times,Q5_3,0,Adaptive resampling and better parallelization,NA
+R_pu6ucDjf0FQv4E9,I have used tidymodels packages a few times,Q5_4,10,"Model monitoring, updating, & organization",NA
+R_pu6ucDjf0FQv4E9,I have used tidymodels packages a few times,Q5_5,0,Translate prediction equations,NA
+R_pu6ucDjf0FQv4E9,I have used tidymodels packages a few times,Q5_6,40,Model stacking ,NA
+R_pu6ucDjf0FQv4E9,I have used tidymodels packages a few times,Q5_8,0,Post-processing in workflow(),NA
+R_pu6ucDjf0FQv4E9,I have used tidymodels packages a few times,Q5_9,0,Ignore recipe steps,NA
+R_pu6ucDjf0FQv4E9,I have used tidymodels packages a few times,Q5_10,0,H2O.ai support ,NA
+R_pu6ucDjf0FQv4E9,I have used tidymodels packages a few times,Q5_12,0,Other,NA
+R_QlIDrfsa2FJDa1j,I have used tidymodels packages a few times,Q5_1,10,Survival analysis,NA
+R_QlIDrfsa2FJDa1j,I have used tidymodels packages a few times,Q5_2,10,Support for sparse data structures,NA
+R_QlIDrfsa2FJDa1j,I have used tidymodels packages a few times,Q5_3,10,Adaptive resampling and better parallelization,NA
+R_QlIDrfsa2FJDa1j,I have used tidymodels packages a few times,Q5_4,20,"Model monitoring, updating, & organization",NA
+R_QlIDrfsa2FJDa1j,I have used tidymodels packages a few times,Q5_5,10,Translate prediction equations,NA
+R_QlIDrfsa2FJDa1j,I have used tidymodels packages a few times,Q5_6,20,Model stacking ,NA
+R_QlIDrfsa2FJDa1j,I have used tidymodels packages a few times,Q5_8,10,Post-processing in workflow(),NA
+R_QlIDrfsa2FJDa1j,I have used tidymodels packages a few times,Q5_9,10,Ignore recipe steps,NA
+R_QlIDrfsa2FJDa1j,I have used tidymodels packages a few times,Q5_10,0,H2O.ai support ,NA
+R_QlIDrfsa2FJDa1j,I have used tidymodels packages a few times,Q5_12,0,Other,NA
+R_29uId5uS82Ihrss,I have used tidymodels packages a few times,Q5_1,0,Survival analysis,NA
+R_29uId5uS82Ihrss,I have used tidymodels packages a few times,Q5_2,10,Support for sparse data structures,NA
+R_29uId5uS82Ihrss,I have used tidymodels packages a few times,Q5_3,30,Adaptive resampling and better parallelization,NA
+R_29uId5uS82Ihrss,I have used tidymodels packages a few times,Q5_4,0,"Model monitoring, updating, & organization",NA
+R_29uId5uS82Ihrss,I have used tidymodels packages a few times,Q5_5,40,Translate prediction equations,NA
+R_29uId5uS82Ihrss,I have used tidymodels packages a few times,Q5_6,10,Model stacking ,NA
+R_29uId5uS82Ihrss,I have used tidymodels packages a few times,Q5_8,0,Post-processing in workflow(),NA
+R_29uId5uS82Ihrss,I have used tidymodels packages a few times,Q5_9,0,Ignore recipe steps,NA
+R_29uId5uS82Ihrss,I have used tidymodels packages a few times,Q5_10,10,H2O.ai support ,NA
+R_29uId5uS82Ihrss,I have used tidymodels packages a few times,Q5_12,0,Other,NA
+R_yvAD28Hlc3dFIJP,I have used tidymodels packages a few times,Q5_1,0,Survival analysis,NA
+R_yvAD28Hlc3dFIJP,I have used tidymodels packages a few times,Q5_2,0,Support for sparse data structures,NA
+R_yvAD28Hlc3dFIJP,I have used tidymodels packages a few times,Q5_3,40,Adaptive resampling and better parallelization,NA
+R_yvAD28Hlc3dFIJP,I have used tidymodels packages a few times,Q5_4,0,"Model monitoring, updating, & organization",NA
+R_yvAD28Hlc3dFIJP,I have used tidymodels packages a few times,Q5_5,30,Translate prediction equations,NA
+R_yvAD28Hlc3dFIJP,I have used tidymodels packages a few times,Q5_6,30,Model stacking ,NA
+R_yvAD28Hlc3dFIJP,I have used tidymodels packages a few times,Q5_8,0,Post-processing in workflow(),NA
+R_yvAD28Hlc3dFIJP,I have used tidymodels packages a few times,Q5_9,0,Ignore recipe steps,NA
+R_yvAD28Hlc3dFIJP,I have used tidymodels packages a few times,Q5_10,0,H2O.ai support ,NA
+R_yvAD28Hlc3dFIJP,I have used tidymodels packages a few times,Q5_12,0,Other,NA
+R_1GE6rpioVpkptGg,I have used tidymodels packages a few times,Q5_1,0,Survival analysis,NA
+R_1GE6rpioVpkptGg,I have used tidymodels packages a few times,Q5_2,20,Support for sparse data structures,NA
+R_1GE6rpioVpkptGg,I have used tidymodels packages a few times,Q5_3,0,Adaptive resampling and better parallelization,NA
+R_1GE6rpioVpkptGg,I have used tidymodels packages a few times,Q5_4,0,"Model monitoring, updating, & organization",NA
+R_1GE6rpioVpkptGg,I have used tidymodels packages a few times,Q5_5,30,Translate prediction equations,NA
+R_1GE6rpioVpkptGg,I have used tidymodels packages a few times,Q5_6,30,Model stacking ,NA
+R_1GE6rpioVpkptGg,I have used tidymodels packages a few times,Q5_8,20,Post-processing in workflow(),NA
+R_1GE6rpioVpkptGg,I have used tidymodels packages a few times,Q5_9,0,Ignore recipe steps,NA
+R_1GE6rpioVpkptGg,I have used tidymodels packages a few times,Q5_10,0,H2O.ai support ,NA
+R_1GE6rpioVpkptGg,I have used tidymodels packages a few times,Q5_12,0,Other,NA
+R_1C75RqE0rGKX1Qr,I have never used tidymodels,Q5_1,0,Survival analysis,NA
+R_1C75RqE0rGKX1Qr,I have never used tidymodels,Q5_2,0,Support for sparse data structures,NA
+R_1C75RqE0rGKX1Qr,I have never used tidymodels,Q5_3,0,Adaptive resampling and better parallelization,NA
+R_1C75RqE0rGKX1Qr,I have never used tidymodels,Q5_4,100,"Model monitoring, updating, & organization",NA
+R_1C75RqE0rGKX1Qr,I have never used tidymodels,Q5_5,0,Translate prediction equations,NA
+R_1C75RqE0rGKX1Qr,I have never used tidymodels,Q5_6,0,Model stacking ,NA
+R_1C75RqE0rGKX1Qr,I have never used tidymodels,Q5_8,0,Post-processing in workflow(),NA
+R_1C75RqE0rGKX1Qr,I have never used tidymodels,Q5_9,0,Ignore recipe steps,NA
+R_1C75RqE0rGKX1Qr,I have never used tidymodels,Q5_10,0,H2O.ai support ,NA
+R_1C75RqE0rGKX1Qr,I have never used tidymodels,Q5_12,0,Other,NA
+R_3EEZDtH2D9rbgyK,I have used tidymodels packages a few times,Q5_1,50,Survival analysis,NA
+R_3EEZDtH2D9rbgyK,I have used tidymodels packages a few times,Q5_2,0,Support for sparse data structures,NA
+R_3EEZDtH2D9rbgyK,I have used tidymodels packages a few times,Q5_3,0,Adaptive resampling and better parallelization,NA
+R_3EEZDtH2D9rbgyK,I have used tidymodels packages a few times,Q5_4,0,"Model monitoring, updating, & organization",NA
+R_3EEZDtH2D9rbgyK,I have used tidymodels packages a few times,Q5_5,0,Translate prediction equations,NA
+R_3EEZDtH2D9rbgyK,I have used tidymodels packages a few times,Q5_6,50,Model stacking ,NA
+R_3EEZDtH2D9rbgyK,I have used tidymodels packages a few times,Q5_8,0,Post-processing in workflow(),NA
+R_3EEZDtH2D9rbgyK,I have used tidymodels packages a few times,Q5_9,0,Ignore recipe steps,NA
+R_3EEZDtH2D9rbgyK,I have used tidymodels packages a few times,Q5_10,0,H2O.ai support ,NA
+R_3EEZDtH2D9rbgyK,I have used tidymodels packages a few times,Q5_12,0,Other,NA
+R_bypp7NXqbtdHTNv,I have used tidymodels packages a few times,Q5_1,0,Survival analysis,NA
+R_bypp7NXqbtdHTNv,I have used tidymodels packages a few times,Q5_2,0,Support for sparse data structures,NA
+R_bypp7NXqbtdHTNv,I have used tidymodels packages a few times,Q5_3,30,Adaptive resampling and better parallelization,NA
+R_bypp7NXqbtdHTNv,I have used tidymodels packages a few times,Q5_4,30,"Model monitoring, updating, & organization",NA
+R_bypp7NXqbtdHTNv,I have used tidymodels packages a few times,Q5_5,0,Translate prediction equations,NA
+R_bypp7NXqbtdHTNv,I have used tidymodels packages a few times,Q5_6,30,Model stacking ,NA
+R_bypp7NXqbtdHTNv,I have used tidymodels packages a few times,Q5_8,0,Post-processing in workflow(),NA
+R_bypp7NXqbtdHTNv,I have used tidymodels packages a few times,Q5_9,10,Ignore recipe steps,NA
+R_bypp7NXqbtdHTNv,I have used tidymodels packages a few times,Q5_10,0,H2O.ai support ,NA
+R_bypp7NXqbtdHTNv,I have used tidymodels packages a few times,Q5_12,0,Other,NA
+R_2TtVO9Civh6iHai,I have used tidymodels packages a few times,Q5_1,0,Survival analysis,NA
+R_2TtVO9Civh6iHai,I have used tidymodels packages a few times,Q5_2,0,Support for sparse data structures,NA
+R_2TtVO9Civh6iHai,I have used tidymodels packages a few times,Q5_3,0,Adaptive resampling and better parallelization,NA
+R_2TtVO9Civh6iHai,I have used tidymodels packages a few times,Q5_4,10,"Model monitoring, updating, & organization",NA
+R_2TtVO9Civh6iHai,I have used tidymodels packages a few times,Q5_5,0,Translate prediction equations,NA
+R_2TtVO9Civh6iHai,I have used tidymodels packages a few times,Q5_6,0,Model stacking ,NA
+R_2TtVO9Civh6iHai,I have used tidymodels packages a few times,Q5_8,0,Post-processing in workflow(),NA
+R_2TtVO9Civh6iHai,I have used tidymodels packages a few times,Q5_9,0,Ignore recipe steps,NA
+R_2TtVO9Civh6iHai,I have used tidymodels packages a few times,Q5_10,90,H2O.ai support ,NA
+R_2TtVO9Civh6iHai,I have used tidymodels packages a few times,Q5_12,0,Other,NA
+R_3Mfo4okM7FPRBYZ,I have used tidymodels packages a few times,Q5_1,30,Survival analysis,NA
+R_3Mfo4okM7FPRBYZ,I have used tidymodels packages a few times,Q5_2,0,Support for sparse data structures,NA
+R_3Mfo4okM7FPRBYZ,I have used tidymodels packages a few times,Q5_3,20,Adaptive resampling and better parallelization,NA
+R_3Mfo4okM7FPRBYZ,I have used tidymodels packages a few times,Q5_4,30,"Model monitoring, updating, & organization",NA
+R_3Mfo4okM7FPRBYZ,I have used tidymodels packages a few times,Q5_5,0,Translate prediction equations,NA
+R_3Mfo4okM7FPRBYZ,I have used tidymodels packages a few times,Q5_6,0,Model stacking ,NA
+R_3Mfo4okM7FPRBYZ,I have used tidymodels packages a few times,Q5_8,20,Post-processing in workflow(),NA
+R_3Mfo4okM7FPRBYZ,I have used tidymodels packages a few times,Q5_9,0,Ignore recipe steps,NA
+R_3Mfo4okM7FPRBYZ,I have used tidymodels packages a few times,Q5_10,0,H2O.ai support ,NA
+R_3Mfo4okM7FPRBYZ,I have used tidymodels packages a few times,Q5_12,0,Other,NA
+R_2BrJGfUqvcJvnYq,I have used tidymodels packages many times,Q5_1,0,Survival analysis,NA
+R_2BrJGfUqvcJvnYq,I have used tidymodels packages many times,Q5_2,30,Support for sparse data structures,NA
+R_2BrJGfUqvcJvnYq,I have used tidymodels packages many times,Q5_3,0,Adaptive resampling and better parallelization,NA
+R_2BrJGfUqvcJvnYq,I have used tidymodels packages many times,Q5_4,50,"Model monitoring, updating, & organization",NA
+R_2BrJGfUqvcJvnYq,I have used tidymodels packages many times,Q5_5,20,Translate prediction equations,NA
+R_2BrJGfUqvcJvnYq,I have used tidymodels packages many times,Q5_6,0,Model stacking ,NA
+R_2BrJGfUqvcJvnYq,I have used tidymodels packages many times,Q5_8,0,Post-processing in workflow(),NA
+R_2BrJGfUqvcJvnYq,I have used tidymodels packages many times,Q5_9,0,Ignore recipe steps,NA
+R_2BrJGfUqvcJvnYq,I have used tidymodels packages many times,Q5_10,0,H2O.ai support ,NA
+R_2BrJGfUqvcJvnYq,I have used tidymodels packages many times,Q5_12,0,Other,NA
+R_1pW0zKfDkuYvEie,I have used tidymodels packages a few times,Q5_1,0,Survival analysis,NA
+R_1pW0zKfDkuYvEie,I have used tidymodels packages a few times,Q5_2,0,Support for sparse data structures,NA
+R_1pW0zKfDkuYvEie,I have used tidymodels packages a few times,Q5_3,0,Adaptive resampling and better parallelization,NA
+R_1pW0zKfDkuYvEie,I have used tidymodels packages a few times,Q5_4,0,"Model monitoring, updating, & organization",NA
+R_1pW0zKfDkuYvEie,I have used tidymodels packages a few times,Q5_5,20,Translate prediction equations,NA
+R_1pW0zKfDkuYvEie,I have used tidymodels packages a few times,Q5_6,30,Model stacking ,NA
+R_1pW0zKfDkuYvEie,I have used tidymodels packages a few times,Q5_8,0,Post-processing in workflow(),NA
+R_1pW0zKfDkuYvEie,I have used tidymodels packages a few times,Q5_9,0,Ignore recipe steps,NA
+R_1pW0zKfDkuYvEie,I have used tidymodels packages a few times,Q5_10,50,H2O.ai support ,NA
+R_1pW0zKfDkuYvEie,I have used tidymodels packages a few times,Q5_12,0,Other,NA
+R_1rxlscXMKdPRGEk,I have used tidymodels packages a few times,Q5_1,40,Survival analysis,NA
+R_1rxlscXMKdPRGEk,I have used tidymodels packages a few times,Q5_2,20,Support for sparse data structures,NA
+R_1rxlscXMKdPRGEk,I have used tidymodels packages a few times,Q5_3,20,Adaptive resampling and better parallelization,NA
+R_1rxlscXMKdPRGEk,I have used tidymodels packages a few times,Q5_4,0,"Model monitoring, updating, & organization",NA
+R_1rxlscXMKdPRGEk,I have used tidymodels packages a few times,Q5_5,0,Translate prediction equations,NA
+R_1rxlscXMKdPRGEk,I have used tidymodels packages a few times,Q5_6,0,Model stacking ,NA
+R_1rxlscXMKdPRGEk,I have used tidymodels packages a few times,Q5_8,0,Post-processing in workflow(),NA
+R_1rxlscXMKdPRGEk,I have used tidymodels packages a few times,Q5_9,20,Ignore recipe steps,NA
+R_1rxlscXMKdPRGEk,I have used tidymodels packages a few times,Q5_10,0,H2O.ai support ,NA
+R_1rxlscXMKdPRGEk,I have used tidymodels packages a few times,Q5_12,0,Other,NA
+R_2CHbMon7Rdc9yPo,I have never used tidymodels,Q5_1,50,Survival analysis,NA
+R_2CHbMon7Rdc9yPo,I have never used tidymodels,Q5_2,0,Support for sparse data structures,NA
+R_2CHbMon7Rdc9yPo,I have never used tidymodels,Q5_3,0,Adaptive resampling and better parallelization,NA
+R_2CHbMon7Rdc9yPo,I have never used tidymodels,Q5_4,0,"Model monitoring, updating, & organization",NA
+R_2CHbMon7Rdc9yPo,I have never used tidymodels,Q5_5,0,Translate prediction equations,NA
+R_2CHbMon7Rdc9yPo,I have never used tidymodels,Q5_6,50,Model stacking ,NA
+R_2CHbMon7Rdc9yPo,I have never used tidymodels,Q5_8,0,Post-processing in workflow(),NA
+R_2CHbMon7Rdc9yPo,I have never used tidymodels,Q5_9,0,Ignore recipe steps,NA
+R_2CHbMon7Rdc9yPo,I have never used tidymodels,Q5_10,0,H2O.ai support ,NA
+R_2CHbMon7Rdc9yPo,I have never used tidymodels,Q5_12,0,Other,NA
+R_3QJRmOsulWNh5EB,I have never used tidymodels,Q5_1,5,Survival analysis,NA
+R_3QJRmOsulWNh5EB,I have never used tidymodels,Q5_2,20,Support for sparse data structures,NA
+R_3QJRmOsulWNh5EB,I have never used tidymodels,Q5_3,20,Adaptive resampling and better parallelization,NA
+R_3QJRmOsulWNh5EB,I have never used tidymodels,Q5_4,0,"Model monitoring, updating, & organization",NA
+R_3QJRmOsulWNh5EB,I have never used tidymodels,Q5_5,0,Translate prediction equations,NA
+R_3QJRmOsulWNh5EB,I have never used tidymodels,Q5_6,30,Model stacking ,NA
+R_3QJRmOsulWNh5EB,I have never used tidymodels,Q5_8,0,Post-processing in workflow(),NA
+R_3QJRmOsulWNh5EB,I have never used tidymodels,Q5_9,5,Ignore recipe steps,NA
+R_3QJRmOsulWNh5EB,I have never used tidymodels,Q5_10,0,H2O.ai support ,NA
+R_3QJRmOsulWNh5EB,I have never used tidymodels,Q5_12,20,Other,Better cross-validation support
+R_3dQc1WODFVH66Wk,I have used tidymodels packages a few times,Q5_1,20,Survival analysis,NA
+R_3dQc1WODFVH66Wk,I have used tidymodels packages a few times,Q5_2,5,Support for sparse data structures,NA
+R_3dQc1WODFVH66Wk,I have used tidymodels packages a few times,Q5_3,20,Adaptive resampling and better parallelization,NA
+R_3dQc1WODFVH66Wk,I have used tidymodels packages a few times,Q5_4,10,"Model monitoring, updating, & organization",NA
+R_3dQc1WODFVH66Wk,I have used tidymodels packages a few times,Q5_5,20,Translate prediction equations,NA
+R_3dQc1WODFVH66Wk,I have used tidymodels packages a few times,Q5_6,5,Model stacking ,NA
+R_3dQc1WODFVH66Wk,I have used tidymodels packages a few times,Q5_8,20,Post-processing in workflow(),NA
+R_3dQc1WODFVH66Wk,I have used tidymodels packages a few times,Q5_9,0,Ignore recipe steps,NA
+R_3dQc1WODFVH66Wk,I have used tidymodels packages a few times,Q5_10,0,H2O.ai support ,NA
+R_3dQc1WODFVH66Wk,I have used tidymodels packages a few times,Q5_12,0,Other,NA
+R_3Hix3i1FIG2kxT4,I have never used tidymodels,Q5_1,10,Survival analysis,NA
+R_3Hix3i1FIG2kxT4,I have never used tidymodels,Q5_2,20,Support for sparse data structures,NA
+R_3Hix3i1FIG2kxT4,I have never used tidymodels,Q5_3,10,Adaptive resampling and better parallelization,NA
+R_3Hix3i1FIG2kxT4,I have never used tidymodels,Q5_4,20,"Model monitoring, updating, & organization",NA
+R_3Hix3i1FIG2kxT4,I have never used tidymodels,Q5_5,10,Translate prediction equations,NA
+R_3Hix3i1FIG2kxT4,I have never used tidymodels,Q5_6,10,Model stacking ,NA
+R_3Hix3i1FIG2kxT4,I have never used tidymodels,Q5_8,10,Post-processing in workflow(),NA
+R_3Hix3i1FIG2kxT4,I have never used tidymodels,Q5_9,10,Ignore recipe steps,NA
+R_3Hix3i1FIG2kxT4,I have never used tidymodels,Q5_10,0,H2O.ai support ,NA
+R_3Hix3i1FIG2kxT4,I have never used tidymodels,Q5_12,0,Other,NA
+R_afL2tTwOvvEXZZL,I have contributed to tidymodels packages or taught others how to use them,Q5_1,5,Survival analysis,NA
+R_afL2tTwOvvEXZZL,I have contributed to tidymodels packages or taught others how to use them,Q5_2,10,Support for sparse data structures,NA
+R_afL2tTwOvvEXZZL,I have contributed to tidymodels packages or taught others how to use them,Q5_3,15,Adaptive resampling and better parallelization,NA
+R_afL2tTwOvvEXZZL,I have contributed to tidymodels packages or taught others how to use them,Q5_4,5,"Model monitoring, updating, & organization",NA
+R_afL2tTwOvvEXZZL,I have contributed to tidymodels packages or taught others how to use them,Q5_5,20,Translate prediction equations,NA
+R_afL2tTwOvvEXZZL,I have contributed to tidymodels packages or taught others how to use them,Q5_6,20,Model stacking ,NA
+R_afL2tTwOvvEXZZL,I have contributed to tidymodels packages or taught others how to use them,Q5_8,20,Post-processing in workflow(),NA
+R_afL2tTwOvvEXZZL,I have contributed to tidymodels packages or taught others how to use them,Q5_9,5,Ignore recipe steps,NA
+R_afL2tTwOvvEXZZL,I have contributed to tidymodels packages or taught others how to use them,Q5_10,0,H2O.ai support ,NA
+R_afL2tTwOvvEXZZL,I have contributed to tidymodels packages or taught others how to use them,Q5_12,0,Other,NA
+R_33fdHH5ss21Xp7o,I have used tidymodels packages a few times,Q5_1,5,Survival analysis,NA
+R_33fdHH5ss21Xp7o,I have used tidymodels packages a few times,Q5_2,0,Support for sparse data structures,NA
+R_33fdHH5ss21Xp7o,I have used tidymodels packages a few times,Q5_3,25,Adaptive resampling and better parallelization,NA
+R_33fdHH5ss21Xp7o,I have used tidymodels packages a few times,Q5_4,25,"Model monitoring, updating, & organization",NA
+R_33fdHH5ss21Xp7o,I have used tidymodels packages a few times,Q5_5,25,Translate prediction equations,NA
+R_33fdHH5ss21Xp7o,I have used tidymodels packages a few times,Q5_6,10,Model stacking ,NA
+R_33fdHH5ss21Xp7o,I have used tidymodels packages a few times,Q5_8,1,Post-processing in workflow(),NA
+R_33fdHH5ss21Xp7o,I have used tidymodels packages a few times,Q5_9,4,Ignore recipe steps,NA
+R_33fdHH5ss21Xp7o,I have used tidymodels packages a few times,Q5_10,5,H2O.ai support ,NA
+R_33fdHH5ss21Xp7o,I have used tidymodels packages a few times,Q5_12,0,Other,NA
+R_3FPbCvB1tLuuBat,I have used tidymodels packages a few times,Q5_1,10,Survival analysis,NA
+R_3FPbCvB1tLuuBat,I have used tidymodels packages a few times,Q5_2,5,Support for sparse data structures,NA
+R_3FPbCvB1tLuuBat,I have used tidymodels packages a few times,Q5_3,20,Adaptive resampling and better parallelization,NA
+R_3FPbCvB1tLuuBat,I have used tidymodels packages a few times,Q5_4,10,"Model monitoring, updating, & organization",NA
+R_3FPbCvB1tLuuBat,I have used tidymodels packages a few times,Q5_5,5,Translate prediction equations,NA
+R_3FPbCvB1tLuuBat,I have used tidymodels packages a few times,Q5_6,20,Model stacking ,NA
+R_3FPbCvB1tLuuBat,I have used tidymodels packages a few times,Q5_8,15,Post-processing in workflow(),NA
+R_3FPbCvB1tLuuBat,I have used tidymodels packages a few times,Q5_9,10,Ignore recipe steps,NA
+R_3FPbCvB1tLuuBat,I have used tidymodels packages a few times,Q5_10,5,H2O.ai support ,NA
+R_3FPbCvB1tLuuBat,I have used tidymodels packages a few times,Q5_12,0,Other,NA
+R_yU9bKL3sQLMKgLv,I have used tidymodels packages a few times,Q5_1,25,Survival analysis,NA
+R_yU9bKL3sQLMKgLv,I have used tidymodels packages a few times,Q5_2,0,Support for sparse data structures,NA
+R_yU9bKL3sQLMKgLv,I have used tidymodels packages a few times,Q5_3,0,Adaptive resampling and better parallelization,NA
+R_yU9bKL3sQLMKgLv,I have used tidymodels packages a few times,Q5_4,25,"Model monitoring, updating, & organization",NA
+R_yU9bKL3sQLMKgLv,I have used tidymodels packages a few times,Q5_5,25,Translate prediction equations,NA
+R_yU9bKL3sQLMKgLv,I have used tidymodels packages a few times,Q5_6,0,Model stacking ,NA
+R_yU9bKL3sQLMKgLv,I have used tidymodels packages a few times,Q5_8,0,Post-processing in workflow(),NA
+R_yU9bKL3sQLMKgLv,I have used tidymodels packages a few times,Q5_9,0,Ignore recipe steps,NA
+R_yU9bKL3sQLMKgLv,I have used tidymodels packages a few times,Q5_10,25,H2O.ai support ,NA
+R_yU9bKL3sQLMKgLv,I have used tidymodels packages a few times,Q5_12,0,Other,NA
+R_xzrTjLlxiwkb4yZ,I have used tidymodels packages many times,Q5_1,0,Survival analysis,NA
+R_xzrTjLlxiwkb4yZ,I have used tidymodels packages many times,Q5_2,0,Support for sparse data structures,NA
+R_xzrTjLlxiwkb4yZ,I have used tidymodels packages many times,Q5_3,20,Adaptive resampling and better parallelization,NA
+R_xzrTjLlxiwkb4yZ,I have used tidymodels packages many times,Q5_4,0,"Model monitoring, updating, & organization",NA
+R_xzrTjLlxiwkb4yZ,I have used tidymodels packages many times,Q5_5,0,Translate prediction equations,NA
+R_xzrTjLlxiwkb4yZ,I have used tidymodels packages many times,Q5_6,30,Model stacking ,NA
+R_xzrTjLlxiwkb4yZ,I have used tidymodels packages many times,Q5_8,0,Post-processing in workflow(),NA
+R_xzrTjLlxiwkb4yZ,I have used tidymodels packages many times,Q5_9,0,Ignore recipe steps,NA
+R_xzrTjLlxiwkb4yZ,I have used tidymodels packages many times,Q5_10,30,H2O.ai support ,NA
+R_xzrTjLlxiwkb4yZ,I have used tidymodels packages many times,Q5_12,20,Other,TensorFlow Support
+R_1Qbwmw2xC5l7Isl,I have used tidymodels packages a few times,Q5_1,0,Survival analysis,NA
+R_1Qbwmw2xC5l7Isl,I have used tidymodels packages a few times,Q5_2,50,Support for sparse data structures,NA
+R_1Qbwmw2xC5l7Isl,I have used tidymodels packages a few times,Q5_3,0,Adaptive resampling and better parallelization,NA
+R_1Qbwmw2xC5l7Isl,I have used tidymodels packages a few times,Q5_4,0,"Model monitoring, updating, & organization",NA
+R_1Qbwmw2xC5l7Isl,I have used tidymodels packages a few times,Q5_5,0,Translate prediction equations,NA
+R_1Qbwmw2xC5l7Isl,I have used tidymodels packages a few times,Q5_6,20,Model stacking ,NA
+R_1Qbwmw2xC5l7Isl,I have used tidymodels packages a few times,Q5_8,0,Post-processing in workflow(),NA
+R_1Qbwmw2xC5l7Isl,I have used tidymodels packages a few times,Q5_9,30,Ignore recipe steps,NA
+R_1Qbwmw2xC5l7Isl,I have used tidymodels packages a few times,Q5_10,0,H2O.ai support ,NA
+R_1Qbwmw2xC5l7Isl,I have used tidymodels packages a few times,Q5_12,0,Other,NA
+R_2Vl8N34lV1B1bQw,I have used tidymodels packages a few times,Q5_1,0,Survival analysis,NA
+R_2Vl8N34lV1B1bQw,I have used tidymodels packages a few times,Q5_2,0,Support for sparse data structures,NA
+R_2Vl8N34lV1B1bQw,I have used tidymodels packages a few times,Q5_3,40,Adaptive resampling and better parallelization,NA
+R_2Vl8N34lV1B1bQw,I have used tidymodels packages a few times,Q5_4,40,"Model monitoring, updating, & organization",NA
+R_2Vl8N34lV1B1bQw,I have used tidymodels packages a few times,Q5_5,0,Translate prediction equations,NA
+R_2Vl8N34lV1B1bQw,I have used tidymodels packages a few times,Q5_6,20,Model stacking ,NA
+R_2Vl8N34lV1B1bQw,I have used tidymodels packages a few times,Q5_8,0,Post-processing in workflow(),NA
+R_2Vl8N34lV1B1bQw,I have used tidymodels packages a few times,Q5_9,0,Ignore recipe steps,NA
+R_2Vl8N34lV1B1bQw,I have used tidymodels packages a few times,Q5_10,0,H2O.ai support ,NA
+R_2Vl8N34lV1B1bQw,I have used tidymodels packages a few times,Q5_12,0,Other,NA
+R_1P75Sv85AETFbrb,I have never used tidymodels,Q5_1,0,Survival analysis,NA
+R_1P75Sv85AETFbrb,I have never used tidymodels,Q5_2,0,Support for sparse data structures,NA
+R_1P75Sv85AETFbrb,I have never used tidymodels,Q5_3,50,Adaptive resampling and better parallelization,NA
+R_1P75Sv85AETFbrb,I have never used tidymodels,Q5_4,0,"Model monitoring, updating, & organization",NA
+R_1P75Sv85AETFbrb,I have never used tidymodels,Q5_5,30,Translate prediction equations,NA
+R_1P75Sv85AETFbrb,I have never used tidymodels,Q5_6,20,Model stacking ,NA
+R_1P75Sv85AETFbrb,I have never used tidymodels,Q5_8,0,Post-processing in workflow(),NA
+R_1P75Sv85AETFbrb,I have never used tidymodels,Q5_9,0,Ignore recipe steps,NA
+R_1P75Sv85AETFbrb,I have never used tidymodels,Q5_10,0,H2O.ai support ,NA
+R_1P75Sv85AETFbrb,I have never used tidymodels,Q5_12,0,Other,NA
+R_1F57CMebmHVXpIK,I have used tidymodels packages a few times,Q5_1,20,Survival analysis,NA
+R_1F57CMebmHVXpIK,I have used tidymodels packages a few times,Q5_2,7,Support for sparse data structures,NA
+R_1F57CMebmHVXpIK,I have used tidymodels packages a few times,Q5_3,20,Adaptive resampling and better parallelization,NA
+R_1F57CMebmHVXpIK,I have used tidymodels packages a few times,Q5_4,10,"Model monitoring, updating, & organization",NA
+R_1F57CMebmHVXpIK,I have used tidymodels packages a few times,Q5_5,2,Translate prediction equations,NA
+R_1F57CMebmHVXpIK,I have used tidymodels packages a few times,Q5_6,9,Model stacking ,NA
+R_1F57CMebmHVXpIK,I have used tidymodels packages a few times,Q5_8,5,Post-processing in workflow(),NA
+R_1F57CMebmHVXpIK,I have used tidymodels packages a few times,Q5_9,2,Ignore recipe steps,NA
+R_1F57CMebmHVXpIK,I have used tidymodels packages a few times,Q5_10,5,H2O.ai support ,NA
+R_1F57CMebmHVXpIK,I have used tidymodels packages a few times,Q5_12,20,Other,Counterfactual prediction
+R_sGLJmUOwSPr6iat,I have used tidymodels packages many times,Q5_1,5,Survival analysis,NA
+R_sGLJmUOwSPr6iat,I have used tidymodels packages many times,Q5_2,5,Support for sparse data structures,NA
+R_sGLJmUOwSPr6iat,I have used tidymodels packages many times,Q5_3,5,Adaptive resampling and better parallelization,NA
+R_sGLJmUOwSPr6iat,I have used tidymodels packages many times,Q5_4,30,"Model monitoring, updating, & organization",NA
+R_sGLJmUOwSPr6iat,I have used tidymodels packages many times,Q5_5,5,Translate prediction equations,NA
+R_sGLJmUOwSPr6iat,I have used tidymodels packages many times,Q5_6,10,Model stacking ,NA
+R_sGLJmUOwSPr6iat,I have used tidymodels packages many times,Q5_8,20,Post-processing in workflow(),NA
+R_sGLJmUOwSPr6iat,I have used tidymodels packages many times,Q5_9,10,Ignore recipe steps,NA
+R_sGLJmUOwSPr6iat,I have used tidymodels packages many times,Q5_10,10,H2O.ai support ,NA
+R_sGLJmUOwSPr6iat,I have used tidymodels packages many times,Q5_12,0,Other,NA
+R_1GP8xmxwmtms0Sm,I have used tidymodels packages a few times,Q5_1,25,Survival analysis,NA
+R_1GP8xmxwmtms0Sm,I have used tidymodels packages a few times,Q5_2,15,Support for sparse data structures,NA
+R_1GP8xmxwmtms0Sm,I have used tidymodels packages a few times,Q5_3,5,Adaptive resampling and better parallelization,NA
+R_1GP8xmxwmtms0Sm,I have used tidymodels packages a few times,Q5_4,15,"Model monitoring, updating, & organization",NA
+R_1GP8xmxwmtms0Sm,I have used tidymodels packages a few times,Q5_5,0,Translate prediction equations,NA
+R_1GP8xmxwmtms0Sm,I have used tidymodels packages a few times,Q5_6,25,Model stacking ,NA
+R_1GP8xmxwmtms0Sm,I have used tidymodels packages a few times,Q5_8,5,Post-processing in workflow(),NA
+R_1GP8xmxwmtms0Sm,I have used tidymodels packages a few times,Q5_9,10,Ignore recipe steps,NA
+R_1GP8xmxwmtms0Sm,I have used tidymodels packages a few times,Q5_10,0,H2O.ai support ,NA
+R_1GP8xmxwmtms0Sm,I have used tidymodels packages a few times,Q5_12,0,Other,NA
+R_XBBK6D5XwGL4rAZ,I have used tidymodels packages a few times,Q5_1,5,Survival analysis,NA
+R_XBBK6D5XwGL4rAZ,I have used tidymodels packages a few times,Q5_2,5,Support for sparse data structures,NA
+R_XBBK6D5XwGL4rAZ,I have used tidymodels packages a few times,Q5_3,15,Adaptive resampling and better parallelization,NA
+R_XBBK6D5XwGL4rAZ,I have used tidymodels packages a few times,Q5_4,25,"Model monitoring, updating, & organization",NA
+R_XBBK6D5XwGL4rAZ,I have used tidymodels packages a few times,Q5_5,15,Translate prediction equations,NA
+R_XBBK6D5XwGL4rAZ,I have used tidymodels packages a few times,Q5_6,10,Model stacking ,NA
+R_XBBK6D5XwGL4rAZ,I have used tidymodels packages a few times,Q5_8,15,Post-processing in workflow(),NA
+R_XBBK6D5XwGL4rAZ,I have used tidymodels packages a few times,Q5_9,10,Ignore recipe steps,NA
+R_XBBK6D5XwGL4rAZ,I have used tidymodels packages a few times,Q5_10,0,H2O.ai support ,NA
+R_XBBK6D5XwGL4rAZ,I have used tidymodels packages a few times,Q5_12,0,Other,NA
+R_3JIwVVNyMOlpIWP,I have used tidymodels packages a few times,Q5_1,0,Survival analysis,NA
+R_3JIwVVNyMOlpIWP,I have used tidymodels packages a few times,Q5_2,25,Support for sparse data structures,NA
+R_3JIwVVNyMOlpIWP,I have used tidymodels packages a few times,Q5_3,0,Adaptive resampling and better parallelization,NA
+R_3JIwVVNyMOlpIWP,I have used tidymodels packages a few times,Q5_4,25,"Model monitoring, updating, & organization",NA
+R_3JIwVVNyMOlpIWP,I have used tidymodels packages a few times,Q5_5,0,Translate prediction equations,NA
+R_3JIwVVNyMOlpIWP,I have used tidymodels packages a few times,Q5_6,25,Model stacking ,NA
+R_3JIwVVNyMOlpIWP,I have used tidymodels packages a few times,Q5_8,0,Post-processing in workflow(),NA
+R_3JIwVVNyMOlpIWP,I have used tidymodels packages a few times,Q5_9,0,Ignore recipe steps,NA
+R_3JIwVVNyMOlpIWP,I have used tidymodels packages a few times,Q5_10,25,H2O.ai support ,NA
+R_3JIwVVNyMOlpIWP,I have used tidymodels packages a few times,Q5_12,0,Other,NA
+R_2frPt3Nq5AdLQ7W,I have never used tidymodels,Q5_1,10,Survival analysis,NA
+R_2frPt3Nq5AdLQ7W,I have never used tidymodels,Q5_2,0,Support for sparse data structures,NA
+R_2frPt3Nq5AdLQ7W,I have never used tidymodels,Q5_3,0,Adaptive resampling and better parallelization,NA
+R_2frPt3Nq5AdLQ7W,I have never used tidymodels,Q5_4,10,"Model monitoring, updating, & organization",NA
+R_2frPt3Nq5AdLQ7W,I have never used tidymodels,Q5_5,50,Translate prediction equations,NA
+R_2frPt3Nq5AdLQ7W,I have never used tidymodels,Q5_6,10,Model stacking ,NA
+R_2frPt3Nq5AdLQ7W,I have never used tidymodels,Q5_8,0,Post-processing in workflow(),NA
+R_2frPt3Nq5AdLQ7W,I have never used tidymodels,Q5_9,5,Ignore recipe steps,NA
+R_2frPt3Nq5AdLQ7W,I have never used tidymodels,Q5_10,15,H2O.ai support ,NA
+R_2frPt3Nq5AdLQ7W,I have never used tidymodels,Q5_12,0,Other,NA
+R_25A8nt7mSb5QYYx,I have used tidymodels packages a few times,Q5_1,0,Survival analysis,NA
+R_25A8nt7mSb5QYYx,I have used tidymodels packages a few times,Q5_2,0,Support for sparse data structures,NA
+R_25A8nt7mSb5QYYx,I have used tidymodels packages a few times,Q5_3,0,Adaptive resampling and better parallelization,NA
+R_25A8nt7mSb5QYYx,I have used tidymodels packages a few times,Q5_4,0,"Model monitoring, updating, & organization",NA
+R_25A8nt7mSb5QYYx,I have used tidymodels packages a few times,Q5_5,100,Translate prediction equations,NA
+R_25A8nt7mSb5QYYx,I have used tidymodels packages a few times,Q5_6,0,Model stacking ,NA
+R_25A8nt7mSb5QYYx,I have used tidymodels packages a few times,Q5_8,0,Post-processing in workflow(),NA
+R_25A8nt7mSb5QYYx,I have used tidymodels packages a few times,Q5_9,0,Ignore recipe steps,NA
+R_25A8nt7mSb5QYYx,I have used tidymodels packages a few times,Q5_10,0,H2O.ai support ,NA
+R_25A8nt7mSb5QYYx,I have used tidymodels packages a few times,Q5_12,0,Other,NA
+R_CkJBGa9Wu2d0QiR,I have used tidymodels packages many times,Q5_1,0,Survival analysis,NA
+R_CkJBGa9Wu2d0QiR,I have used tidymodels packages many times,Q5_2,0,Support for sparse data structures,NA
+R_CkJBGa9Wu2d0QiR,I have used tidymodels packages many times,Q5_3,10,Adaptive resampling and better parallelization,NA
+R_CkJBGa9Wu2d0QiR,I have used tidymodels packages many times,Q5_4,30,"Model monitoring, updating, & organization",NA
+R_CkJBGa9Wu2d0QiR,I have used tidymodels packages many times,Q5_5,30,Translate prediction equations,NA
+R_CkJBGa9Wu2d0QiR,I have used tidymodels packages many times,Q5_6,15,Model stacking ,NA
+R_CkJBGa9Wu2d0QiR,I have used tidymodels packages many times,Q5_8,5,Post-processing in workflow(),NA
+R_CkJBGa9Wu2d0QiR,I have used tidymodels packages many times,Q5_9,5,Ignore recipe steps,NA
+R_CkJBGa9Wu2d0QiR,I have used tidymodels packages many times,Q5_10,5,H2O.ai support ,NA
+R_CkJBGa9Wu2d0QiR,I have used tidymodels packages many times,Q5_12,0,Other,NA
+R_2yrrpnlBi351Wzm,I have used tidymodels packages a few times,Q5_1,10,Survival analysis,NA
+R_2yrrpnlBi351Wzm,I have used tidymodels packages a few times,Q5_2,0,Support for sparse data structures,NA
+R_2yrrpnlBi351Wzm,I have used tidymodels packages a few times,Q5_3,0,Adaptive resampling and better parallelization,NA
+R_2yrrpnlBi351Wzm,I have used tidymodels packages a few times,Q5_4,0,"Model monitoring, updating, & organization",NA
+R_2yrrpnlBi351Wzm,I have used tidymodels packages a few times,Q5_5,20,Translate prediction equations,NA
+R_2yrrpnlBi351Wzm,I have used tidymodels packages a few times,Q5_6,60,Model stacking ,NA
+R_2yrrpnlBi351Wzm,I have used tidymodels packages a few times,Q5_8,10,Post-processing in workflow(),NA
+R_2yrrpnlBi351Wzm,I have used tidymodels packages a few times,Q5_9,0,Ignore recipe steps,NA
+R_2yrrpnlBi351Wzm,I have used tidymodels packages a few times,Q5_10,0,H2O.ai support ,NA
+R_2yrrpnlBi351Wzm,I have used tidymodels packages a few times,Q5_12,0,Other,NA
+R_pH6lDwEMZK3vnXj,I have used tidymodels packages a few times,Q5_1,10,Survival analysis,NA
+R_pH6lDwEMZK3vnXj,I have used tidymodels packages a few times,Q5_2,0,Support for sparse data structures,NA
+R_pH6lDwEMZK3vnXj,I have used tidymodels packages a few times,Q5_3,0,Adaptive resampling and better parallelization,NA
+R_pH6lDwEMZK3vnXj,I have used tidymodels packages a few times,Q5_4,10,"Model monitoring, updating, & organization",NA
+R_pH6lDwEMZK3vnXj,I have used tidymodels packages a few times,Q5_5,0,Translate prediction equations,NA
+R_pH6lDwEMZK3vnXj,I have used tidymodels packages a few times,Q5_6,30,Model stacking ,NA
+R_pH6lDwEMZK3vnXj,I have used tidymodels packages a few times,Q5_8,20,Post-processing in workflow(),NA
+R_pH6lDwEMZK3vnXj,I have used tidymodels packages a few times,Q5_9,30,Ignore recipe steps,NA
+R_pH6lDwEMZK3vnXj,I have used tidymodels packages a few times,Q5_10,0,H2O.ai support ,NA
+R_pH6lDwEMZK3vnXj,I have used tidymodels packages a few times,Q5_12,0,Other,NA
+R_1eEo0Ya8hYDFYBv,I have used tidymodels packages many times,Q5_1,30,Survival analysis,NA
+R_1eEo0Ya8hYDFYBv,I have used tidymodels packages many times,Q5_2,10,Support for sparse data structures,NA
+R_1eEo0Ya8hYDFYBv,I have used tidymodels packages many times,Q5_3,0,Adaptive resampling and better parallelization,NA
+R_1eEo0Ya8hYDFYBv,I have used tidymodels packages many times,Q5_4,0,"Model monitoring, updating, & organization",NA
+R_1eEo0Ya8hYDFYBv,I have used tidymodels packages many times,Q5_5,0,Translate prediction equations,NA
+R_1eEo0Ya8hYDFYBv,I have used tidymodels packages many times,Q5_6,0,Model stacking ,NA
+R_1eEo0Ya8hYDFYBv,I have used tidymodels packages many times,Q5_8,10,Post-processing in workflow(),NA
+R_1eEo0Ya8hYDFYBv,I have used tidymodels packages many times,Q5_9,20,Ignore recipe steps,NA
+R_1eEo0Ya8hYDFYBv,I have used tidymodels packages many times,Q5_10,0,H2O.ai support ,NA
+R_1eEo0Ya8hYDFYBv,I have used tidymodels packages many times,Q5_12,30,Other,Reduce size of bloated recipes and models
+R_uxmdhw05u8qGTCh,I have used tidymodels packages a few times,Q5_1,0,Survival analysis,NA
+R_uxmdhw05u8qGTCh,I have used tidymodels packages a few times,Q5_2,30,Support for sparse data structures,NA
+R_uxmdhw05u8qGTCh,I have used tidymodels packages a few times,Q5_3,0,Adaptive resampling and better parallelization,NA
+R_uxmdhw05u8qGTCh,I have used tidymodels packages a few times,Q5_4,40,"Model monitoring, updating, & organization",NA
+R_uxmdhw05u8qGTCh,I have used tidymodels packages a few times,Q5_5,0,Translate prediction equations,NA
+R_uxmdhw05u8qGTCh,I have used tidymodels packages a few times,Q5_6,20,Model stacking ,NA
+R_uxmdhw05u8qGTCh,I have used tidymodels packages a few times,Q5_8,10,Post-processing in workflow(),NA
+R_uxmdhw05u8qGTCh,I have used tidymodels packages a few times,Q5_9,0,Ignore recipe steps,NA
+R_uxmdhw05u8qGTCh,I have used tidymodels packages a few times,Q5_10,0,H2O.ai support ,NA
+R_uxmdhw05u8qGTCh,I have used tidymodels packages a few times,Q5_12,0,Other,NA
+R_1H1snYMFKMefYXh,I have used tidymodels packages many times,Q5_1,0,Survival analysis,NA
+R_1H1snYMFKMefYXh,I have used tidymodels packages many times,Q5_2,0,Support for sparse data structures,NA
+R_1H1snYMFKMefYXh,I have used tidymodels packages many times,Q5_3,40,Adaptive resampling and better parallelization,NA
+R_1H1snYMFKMefYXh,I have used tidymodels packages many times,Q5_4,20,"Model monitoring, updating, & organization",NA
+R_1H1snYMFKMefYXh,I have used tidymodels packages many times,Q5_5,20,Translate prediction equations,NA
+R_1H1snYMFKMefYXh,I have used tidymodels packages many times,Q5_6,0,Model stacking ,NA
+R_1H1snYMFKMefYXh,I have used tidymodels packages many times,Q5_8,20,Post-processing in workflow(),NA
+R_1H1snYMFKMefYXh,I have used tidymodels packages many times,Q5_9,0,Ignore recipe steps,NA
+R_1H1snYMFKMefYXh,I have used tidymodels packages many times,Q5_10,0,H2O.ai support ,NA
+R_1H1snYMFKMefYXh,I have used tidymodels packages many times,Q5_12,0,Other,NA
+R_3G9SRPrJuy1UeJy,I have used tidymodels packages a few times,Q5_1,10,Survival analysis,NA
+R_3G9SRPrJuy1UeJy,I have used tidymodels packages a few times,Q5_2,5,Support for sparse data structures,NA
+R_3G9SRPrJuy1UeJy,I have used tidymodels packages a few times,Q5_3,20,Adaptive resampling and better parallelization,NA
+R_3G9SRPrJuy1UeJy,I have used tidymodels packages a few times,Q5_4,15,"Model monitoring, updating, & organization",NA
+R_3G9SRPrJuy1UeJy,I have used tidymodels packages a few times,Q5_5,20,Translate prediction equations,NA
+R_3G9SRPrJuy1UeJy,I have used tidymodels packages a few times,Q5_6,10,Model stacking ,NA
+R_3G9SRPrJuy1UeJy,I have used tidymodels packages a few times,Q5_8,5,Post-processing in workflow(),NA
+R_3G9SRPrJuy1UeJy,I have used tidymodels packages a few times,Q5_9,5,Ignore recipe steps,NA
+R_3G9SRPrJuy1UeJy,I have used tidymodels packages a few times,Q5_10,10,H2O.ai support ,NA
+R_3G9SRPrJuy1UeJy,I have used tidymodels packages a few times,Q5_12,0,Other,NA
+R_ZCrJrT5hHHYkayd,I have used tidymodels packages a few times,Q5_1,0,Survival analysis,NA
+R_ZCrJrT5hHHYkayd,I have used tidymodels packages a few times,Q5_2,15,Support for sparse data structures,NA
+R_ZCrJrT5hHHYkayd,I have used tidymodels packages a few times,Q5_3,20,Adaptive resampling and better parallelization,NA
+R_ZCrJrT5hHHYkayd,I have used tidymodels packages a few times,Q5_4,20,"Model monitoring, updating, & organization",NA
+R_ZCrJrT5hHHYkayd,I have used tidymodels packages a few times,Q5_5,0,Translate prediction equations,NA
+R_ZCrJrT5hHHYkayd,I have used tidymodels packages a few times,Q5_6,25,Model stacking ,NA
+R_ZCrJrT5hHHYkayd,I have used tidymodels packages a few times,Q5_8,0,Post-processing in workflow(),NA
+R_ZCrJrT5hHHYkayd,I have used tidymodels packages a few times,Q5_9,0,Ignore recipe steps,NA
+R_ZCrJrT5hHHYkayd,I have used tidymodels packages a few times,Q5_10,20,H2O.ai support ,NA
+R_ZCrJrT5hHHYkayd,I have used tidymodels packages a few times,Q5_12,0,Other,NA
+R_tLGysScNnfbS8AV,I have never used tidymodels,Q5_1,0,Survival analysis,NA
+R_tLGysScNnfbS8AV,I have never used tidymodels,Q5_2,0,Support for sparse data structures,NA
+R_tLGysScNnfbS8AV,I have never used tidymodels,Q5_3,0,Adaptive resampling and better parallelization,NA
+R_tLGysScNnfbS8AV,I have never used tidymodels,Q5_4,50,"Model monitoring, updating, & organization",NA
+R_tLGysScNnfbS8AV,I have never used tidymodels,Q5_5,50,Translate prediction equations,NA
+R_tLGysScNnfbS8AV,I have never used tidymodels,Q5_6,0,Model stacking ,NA
+R_tLGysScNnfbS8AV,I have never used tidymodels,Q5_8,0,Post-processing in workflow(),NA
+R_tLGysScNnfbS8AV,I have never used tidymodels,Q5_9,0,Ignore recipe steps,NA
+R_tLGysScNnfbS8AV,I have never used tidymodels,Q5_10,0,H2O.ai support ,NA
+R_tLGysScNnfbS8AV,I have never used tidymodels,Q5_12,0,Other,NA
+R_vwfvofFzN2l126J,I have never used tidymodels,Q5_1,0,Survival analysis,NA
+R_vwfvofFzN2l126J,I have never used tidymodels,Q5_2,0,Support for sparse data structures,NA
+R_vwfvofFzN2l126J,I have never used tidymodels,Q5_3,5,Adaptive resampling and better parallelization,NA
+R_vwfvofFzN2l126J,I have never used tidymodels,Q5_4,30,"Model monitoring, updating, & organization",NA
+R_vwfvofFzN2l126J,I have never used tidymodels,Q5_5,0,Translate prediction equations,NA
+R_vwfvofFzN2l126J,I have never used tidymodels,Q5_6,10,Model stacking ,NA
+R_vwfvofFzN2l126J,I have never used tidymodels,Q5_8,40,Post-processing in workflow(),NA
+R_vwfvofFzN2l126J,I have never used tidymodels,Q5_9,15,Ignore recipe steps,NA
+R_vwfvofFzN2l126J,I have never used tidymodels,Q5_10,0,H2O.ai support ,NA
+R_vwfvofFzN2l126J,I have never used tidymodels,Q5_12,0,Other,NA
+R_3j1lE1GoKbv1WGI,I have used tidymodels packages a few times,Q5_1,5,Survival analysis,NA
+R_3j1lE1GoKbv1WGI,I have used tidymodels packages a few times,Q5_2,2,Support for sparse data structures,NA
+R_3j1lE1GoKbv1WGI,I have used tidymodels packages a few times,Q5_3,10,Adaptive resampling and better parallelization,NA
+R_3j1lE1GoKbv1WGI,I have used tidymodels packages a few times,Q5_4,15,"Model monitoring, updating, & organization",NA
+R_3j1lE1GoKbv1WGI,I have used tidymodels packages a few times,Q5_5,3,Translate prediction equations,NA
+R_3j1lE1GoKbv1WGI,I have used tidymodels packages a few times,Q5_6,15,Model stacking ,NA
+R_3j1lE1GoKbv1WGI,I have used tidymodels packages a few times,Q5_8,5,Post-processing in workflow(),NA
+R_3j1lE1GoKbv1WGI,I have used tidymodels packages a few times,Q5_9,5,Ignore recipe steps,NA
+R_3j1lE1GoKbv1WGI,I have used tidymodels packages a few times,Q5_10,25,H2O.ai support ,NA
+R_3j1lE1GoKbv1WGI,I have used tidymodels packages a few times,Q5_12,15,Other,Explaining Model Results like in https://github.com/ModelOriented/DrWhy
+R_3lDHttMWeEqTVQ9,I have used tidymodels packages a few times,Q5_1,20,Survival analysis,NA
+R_3lDHttMWeEqTVQ9,I have used tidymodels packages a few times,Q5_2,0,Support for sparse data structures,NA
+R_3lDHttMWeEqTVQ9,I have used tidymodels packages a few times,Q5_3,20,Adaptive resampling and better parallelization,NA
+R_3lDHttMWeEqTVQ9,I have used tidymodels packages a few times,Q5_4,20,"Model monitoring, updating, & organization",NA
+R_3lDHttMWeEqTVQ9,I have used tidymodels packages a few times,Q5_5,0,Translate prediction equations,NA
+R_3lDHttMWeEqTVQ9,I have used tidymodels packages a few times,Q5_6,30,Model stacking ,NA
+R_3lDHttMWeEqTVQ9,I have used tidymodels packages a few times,Q5_8,10,Post-processing in workflow(),NA
+R_3lDHttMWeEqTVQ9,I have used tidymodels packages a few times,Q5_9,0,Ignore recipe steps,NA
+R_3lDHttMWeEqTVQ9,I have used tidymodels packages a few times,Q5_10,0,H2O.ai support ,NA
+R_3lDHttMWeEqTVQ9,I have used tidymodels packages a few times,Q5_12,0,Other,NA
+R_2bGXhpeHYdcy1NV,I have used tidymodels packages many times,Q5_1,10,Survival analysis,NA
+R_2bGXhpeHYdcy1NV,I have used tidymodels packages many times,Q5_2,10,Support for sparse data structures,NA
+R_2bGXhpeHYdcy1NV,I have used tidymodels packages many times,Q5_3,0,Adaptive resampling and better parallelization,NA
+R_2bGXhpeHYdcy1NV,I have used tidymodels packages many times,Q5_4,20,"Model monitoring, updating, & organization",NA
+R_2bGXhpeHYdcy1NV,I have used tidymodels packages many times,Q5_5,10,Translate prediction equations,NA
+R_2bGXhpeHYdcy1NV,I have used tidymodels packages many times,Q5_6,10,Model stacking ,NA
+R_2bGXhpeHYdcy1NV,I have used tidymodels packages many times,Q5_8,10,Post-processing in workflow(),NA
+R_2bGXhpeHYdcy1NV,I have used tidymodels packages many times,Q5_9,0,Ignore recipe steps,NA
+R_2bGXhpeHYdcy1NV,I have used tidymodels packages many times,Q5_10,30,H2O.ai support ,NA
+R_2bGXhpeHYdcy1NV,I have used tidymodels packages many times,Q5_12,0,Other,NA
+R_Rq8CL3QEbDouyyZ,I have used tidymodels packages a few times,Q5_1,0,Survival analysis,NA
+R_Rq8CL3QEbDouyyZ,I have used tidymodels packages a few times,Q5_2,0,Support for sparse data structures,NA
+R_Rq8CL3QEbDouyyZ,I have used tidymodels packages a few times,Q5_3,0,Adaptive resampling and better parallelization,NA
+R_Rq8CL3QEbDouyyZ,I have used tidymodels packages a few times,Q5_4,0,"Model monitoring, updating, & organization",NA
+R_Rq8CL3QEbDouyyZ,I have used tidymodels packages a few times,Q5_5,50,Translate prediction equations,NA
+R_Rq8CL3QEbDouyyZ,I have used tidymodels packages a few times,Q5_6,50,Model stacking ,NA
+R_Rq8CL3QEbDouyyZ,I have used tidymodels packages a few times,Q5_8,0,Post-processing in workflow(),NA
+R_Rq8CL3QEbDouyyZ,I have used tidymodels packages a few times,Q5_9,0,Ignore recipe steps,NA
+R_Rq8CL3QEbDouyyZ,I have used tidymodels packages a few times,Q5_10,0,H2O.ai support ,NA
+R_Rq8CL3QEbDouyyZ,I have used tidymodels packages a few times,Q5_12,0,Other,NA
+R_2VBKS6qIaCIBMLw,I have used tidymodels packages a few times,Q5_1,0,Survival analysis,NA
+R_2VBKS6qIaCIBMLw,I have used tidymodels packages a few times,Q5_2,0,Support for sparse data structures,NA
+R_2VBKS6qIaCIBMLw,I have used tidymodels packages a few times,Q5_3,0,Adaptive resampling and better parallelization,NA
+R_2VBKS6qIaCIBMLw,I have used tidymodels packages a few times,Q5_4,50,"Model monitoring, updating, & organization",NA
+R_2VBKS6qIaCIBMLw,I have used tidymodels packages a few times,Q5_5,0,Translate prediction equations,NA
+R_2VBKS6qIaCIBMLw,I have used tidymodels packages a few times,Q5_6,25,Model stacking ,NA
+R_2VBKS6qIaCIBMLw,I have used tidymodels packages a few times,Q5_8,0,Post-processing in workflow(),NA
+R_2VBKS6qIaCIBMLw,I have used tidymodels packages a few times,Q5_9,0,Ignore recipe steps,NA
+R_2VBKS6qIaCIBMLw,I have used tidymodels packages a few times,Q5_10,0,H2O.ai support ,NA
+R_2VBKS6qIaCIBMLw,I have used tidymodels packages a few times,Q5_12,25,Other,Documentation
+R_2SBw23xF2NjXMDn,I have used tidymodels packages a few times,Q5_1,15,Survival analysis,NA
+R_2SBw23xF2NjXMDn,I have used tidymodels packages a few times,Q5_2,5,Support for sparse data structures,NA
+R_2SBw23xF2NjXMDn,I have used tidymodels packages a few times,Q5_3,0,Adaptive resampling and better parallelization,NA
+R_2SBw23xF2NjXMDn,I have used tidymodels packages a few times,Q5_4,20,"Model monitoring, updating, & organization",NA
+R_2SBw23xF2NjXMDn,I have used tidymodels packages a few times,Q5_5,15,Translate prediction equations,NA
+R_2SBw23xF2NjXMDn,I have used tidymodels packages a few times,Q5_6,20,Model stacking ,NA
+R_2SBw23xF2NjXMDn,I have used tidymodels packages a few times,Q5_8,15,Post-processing in workflow(),NA
+R_2SBw23xF2NjXMDn,I have used tidymodels packages a few times,Q5_9,0,Ignore recipe steps,NA
+R_2SBw23xF2NjXMDn,I have used tidymodels packages a few times,Q5_10,10,H2O.ai support ,NA
+R_2SBw23xF2NjXMDn,I have used tidymodels packages a few times,Q5_12,0,Other,NA
+R_2alaN8wfjkilgvZ,I have used tidymodels packages a few times,Q5_1,50,Survival analysis,NA
+R_2alaN8wfjkilgvZ,I have used tidymodels packages a few times,Q5_2,50,Support for sparse data structures,NA
+R_2alaN8wfjkilgvZ,I have used tidymodels packages a few times,Q5_3,0,Adaptive resampling and better parallelization,NA
+R_2alaN8wfjkilgvZ,I have used tidymodels packages a few times,Q5_4,0,"Model monitoring, updating, & organization",NA
+R_2alaN8wfjkilgvZ,I have used tidymodels packages a few times,Q5_5,0,Translate prediction equations,NA
+R_2alaN8wfjkilgvZ,I have used tidymodels packages a few times,Q5_6,0,Model stacking ,NA
+R_2alaN8wfjkilgvZ,I have used tidymodels packages a few times,Q5_8,0,Post-processing in workflow(),NA
+R_2alaN8wfjkilgvZ,I have used tidymodels packages a few times,Q5_9,0,Ignore recipe steps,NA
+R_2alaN8wfjkilgvZ,I have used tidymodels packages a few times,Q5_10,0,H2O.ai support ,NA
+R_2alaN8wfjkilgvZ,I have used tidymodels packages a few times,Q5_12,0,Other,NA
+R_77DgnJnR7UyrURP,I have used tidymodels packages a few times,Q5_1,5,Survival analysis,NA
+R_77DgnJnR7UyrURP,I have used tidymodels packages a few times,Q5_2,0,Support for sparse data structures,NA
+R_77DgnJnR7UyrURP,I have used tidymodels packages a few times,Q5_3,10,Adaptive resampling and better parallelization,NA
+R_77DgnJnR7UyrURP,I have used tidymodels packages a few times,Q5_4,35,"Model monitoring, updating, & organization",NA
+R_77DgnJnR7UyrURP,I have used tidymodels packages a few times,Q5_5,5,Translate prediction equations,NA
+R_77DgnJnR7UyrURP,I have used tidymodels packages a few times,Q5_6,5,Model stacking ,NA
+R_77DgnJnR7UyrURP,I have used tidymodels packages a few times,Q5_8,0,Post-processing in workflow(),NA
+R_77DgnJnR7UyrURP,I have used tidymodels packages a few times,Q5_9,5,Ignore recipe steps,NA
+R_77DgnJnR7UyrURP,I have used tidymodels packages a few times,Q5_10,35,H2O.ai support ,NA
+R_77DgnJnR7UyrURP,I have used tidymodels packages a few times,Q5_12,0,Other,NA
+R_5vjca9ZCVMeHo1b,I have used tidymodels packages a few times,Q5_1,0,Survival analysis,NA
+R_5vjca9ZCVMeHo1b,I have used tidymodels packages a few times,Q5_2,0,Support for sparse data structures,NA
+R_5vjca9ZCVMeHo1b,I have used tidymodels packages a few times,Q5_3,0,Adaptive resampling and better parallelization,NA
+R_5vjca9ZCVMeHo1b,I have used tidymodels packages a few times,Q5_4,0,"Model monitoring, updating, & organization",NA
+R_5vjca9ZCVMeHo1b,I have used tidymodels packages a few times,Q5_5,0,Translate prediction equations,NA
+R_5vjca9ZCVMeHo1b,I have used tidymodels packages a few times,Q5_6,0,Model stacking ,NA
+R_5vjca9ZCVMeHo1b,I have used tidymodels packages a few times,Q5_8,0,Post-processing in workflow(),NA
+R_5vjca9ZCVMeHo1b,I have used tidymodels packages a few times,Q5_9,0,Ignore recipe steps,NA
+R_5vjca9ZCVMeHo1b,I have used tidymodels packages a few times,Q5_10,0,H2O.ai support ,NA
+R_5vjca9ZCVMeHo1b,I have used tidymodels packages a few times,Q5_12,100,Other,Simplify the workflow further
+R_8xiK4gISO3M341r,I have used tidymodels packages a few times,Q5_1,100,Survival analysis,NA
+R_8xiK4gISO3M341r,I have used tidymodels packages a few times,Q5_2,0,Support for sparse data structures,NA
+R_8xiK4gISO3M341r,I have used tidymodels packages a few times,Q5_3,0,Adaptive resampling and better parallelization,NA
+R_8xiK4gISO3M341r,I have used tidymodels packages a few times,Q5_4,0,"Model monitoring, updating, & organization",NA
+R_8xiK4gISO3M341r,I have used tidymodels packages a few times,Q5_5,0,Translate prediction equations,NA
+R_8xiK4gISO3M341r,I have used tidymodels packages a few times,Q5_6,0,Model stacking ,NA
+R_8xiK4gISO3M341r,I have used tidymodels packages a few times,Q5_8,0,Post-processing in workflow(),NA
+R_8xiK4gISO3M341r,I have used tidymodels packages a few times,Q5_9,0,Ignore recipe steps,NA
+R_8xiK4gISO3M341r,I have used tidymodels packages a few times,Q5_10,0,H2O.ai support ,NA
+R_8xiK4gISO3M341r,I have used tidymodels packages a few times,Q5_12,0,Other,NA
+R_3EEYbpVMJrUpl7S,I have used tidymodels packages a few times,Q5_1,10,Survival analysis,NA
+R_3EEYbpVMJrUpl7S,I have used tidymodels packages a few times,Q5_2,0,Support for sparse data structures,NA
+R_3EEYbpVMJrUpl7S,I have used tidymodels packages a few times,Q5_3,0,Adaptive resampling and better parallelization,NA
+R_3EEYbpVMJrUpl7S,I have used tidymodels packages a few times,Q5_4,15,"Model monitoring, updating, & organization",NA
+R_3EEYbpVMJrUpl7S,I have used tidymodels packages a few times,Q5_5,0,Translate prediction equations,NA
+R_3EEYbpVMJrUpl7S,I have used tidymodels packages a few times,Q5_6,50,Model stacking ,NA
+R_3EEYbpVMJrUpl7S,I have used tidymodels packages a few times,Q5_8,15,Post-processing in workflow(),NA
+R_3EEYbpVMJrUpl7S,I have used tidymodels packages a few times,Q5_9,0,Ignore recipe steps,NA
+R_3EEYbpVMJrUpl7S,I have used tidymodels packages a few times,Q5_10,10,H2O.ai support ,NA
+R_3EEYbpVMJrUpl7S,I have used tidymodels packages a few times,Q5_12,0,Other,NA
+R_1pnUKEnaqKScLzM,I have used tidymodels packages a few times,Q5_1,10,Survival analysis,NA
+R_1pnUKEnaqKScLzM,I have used tidymodels packages a few times,Q5_2,0,Support for sparse data structures,NA
+R_1pnUKEnaqKScLzM,I have used tidymodels packages a few times,Q5_3,0,Adaptive resampling and better parallelization,NA
+R_1pnUKEnaqKScLzM,I have used tidymodels packages a few times,Q5_4,0,"Model monitoring, updating, & organization",NA
+R_1pnUKEnaqKScLzM,I have used tidymodels packages a few times,Q5_5,0,Translate prediction equations,NA
+R_1pnUKEnaqKScLzM,I have used tidymodels packages a few times,Q5_6,50,Model stacking ,NA
+R_1pnUKEnaqKScLzM,I have used tidymodels packages a few times,Q5_8,15,Post-processing in workflow(),NA
+R_1pnUKEnaqKScLzM,I have used tidymodels packages a few times,Q5_9,25,Ignore recipe steps,NA
+R_1pnUKEnaqKScLzM,I have used tidymodels packages a few times,Q5_10,0,H2O.ai support ,NA
+R_1pnUKEnaqKScLzM,I have used tidymodels packages a few times,Q5_12,0,Other,NA
+R_2cvVhsL5GeZvYam,I have used tidymodels packages a few times,Q5_1,0,Survival analysis,NA
+R_2cvVhsL5GeZvYam,I have used tidymodels packages a few times,Q5_2,0,Support for sparse data structures,NA
+R_2cvVhsL5GeZvYam,I have used tidymodels packages a few times,Q5_3,0,Adaptive resampling and better parallelization,NA
+R_2cvVhsL5GeZvYam,I have used tidymodels packages a few times,Q5_4,0,"Model monitoring, updating, & organization",NA
+R_2cvVhsL5GeZvYam,I have used tidymodels packages a few times,Q5_5,50,Translate prediction equations,NA
+R_2cvVhsL5GeZvYam,I have used tidymodels packages a few times,Q5_6,0,Model stacking ,NA
+R_2cvVhsL5GeZvYam,I have used tidymodels packages a few times,Q5_8,0,Post-processing in workflow(),NA
+R_2cvVhsL5GeZvYam,I have used tidymodels packages a few times,Q5_9,0,Ignore recipe steps,NA
+R_2cvVhsL5GeZvYam,I have used tidymodels packages a few times,Q5_10,50,H2O.ai support ,NA
+R_2cvVhsL5GeZvYam,I have used tidymodels packages a few times,Q5_12,0,Other,NA
+R_1DPj6R36WpbdgqI,I have used tidymodels packages a few times,Q5_1,0,Survival analysis,NA
+R_1DPj6R36WpbdgqI,I have used tidymodels packages a few times,Q5_2,0,Support for sparse data structures,NA
+R_1DPj6R36WpbdgqI,I have used tidymodels packages a few times,Q5_3,0,Adaptive resampling and better parallelization,NA
+R_1DPj6R36WpbdgqI,I have used tidymodels packages a few times,Q5_4,0,"Model monitoring, updating, & organization",NA
+R_1DPj6R36WpbdgqI,I have used tidymodels packages a few times,Q5_5,25,Translate prediction equations,NA
+R_1DPj6R36WpbdgqI,I have used tidymodels packages a few times,Q5_6,75,Model stacking ,NA
+R_1DPj6R36WpbdgqI,I have used tidymodels packages a few times,Q5_8,0,Post-processing in workflow(),NA
+R_1DPj6R36WpbdgqI,I have used tidymodels packages a few times,Q5_9,0,Ignore recipe steps,NA
+R_1DPj6R36WpbdgqI,I have used tidymodels packages a few times,Q5_10,0,H2O.ai support ,NA
+R_1DPj6R36WpbdgqI,I have used tidymodels packages a few times,Q5_12,0,Other,NA
+R_3mmjQ0wHbTmhaFH,I have used tidymodels packages a few times,Q5_1,0,Survival analysis,NA
+R_3mmjQ0wHbTmhaFH,I have used tidymodels packages a few times,Q5_2,0,Support for sparse data structures,NA
+R_3mmjQ0wHbTmhaFH,I have used tidymodels packages a few times,Q5_3,0,Adaptive resampling and better parallelization,NA
+R_3mmjQ0wHbTmhaFH,I have used tidymodels packages a few times,Q5_4,15,"Model monitoring, updating, & organization",NA
+R_3mmjQ0wHbTmhaFH,I have used tidymodels packages a few times,Q5_5,20,Translate prediction equations,NA
+R_3mmjQ0wHbTmhaFH,I have used tidymodels packages a few times,Q5_6,20,Model stacking ,NA
+R_3mmjQ0wHbTmhaFH,I have used tidymodels packages a few times,Q5_8,10,Post-processing in workflow(),NA
+R_3mmjQ0wHbTmhaFH,I have used tidymodels packages a few times,Q5_9,0,Ignore recipe steps,NA
+R_3mmjQ0wHbTmhaFH,I have used tidymodels packages a few times,Q5_10,35,H2O.ai support ,NA
+R_3mmjQ0wHbTmhaFH,I have used tidymodels packages a few times,Q5_12,0,Other,NA
+R_0wu7Uus5pxwTcOZ,I have used tidymodels packages a few times,Q5_1,0,Survival analysis,NA
+R_0wu7Uus5pxwTcOZ,I have used tidymodels packages a few times,Q5_2,10,Support for sparse data structures,NA
+R_0wu7Uus5pxwTcOZ,I have used tidymodels packages a few times,Q5_3,0,Adaptive resampling and better parallelization,NA
+R_0wu7Uus5pxwTcOZ,I have used tidymodels packages a few times,Q5_4,23,"Model monitoring, updating, & organization",NA
+R_0wu7Uus5pxwTcOZ,I have used tidymodels packages a few times,Q5_5,0,Translate prediction equations,NA
+R_0wu7Uus5pxwTcOZ,I have used tidymodels packages a few times,Q5_6,46,Model stacking ,NA
+R_0wu7Uus5pxwTcOZ,I have used tidymodels packages a few times,Q5_8,0,Post-processing in workflow(),NA
+R_0wu7Uus5pxwTcOZ,I have used tidymodels packages a few times,Q5_9,21,Ignore recipe steps,NA
+R_0wu7Uus5pxwTcOZ,I have used tidymodels packages a few times,Q5_10,0,H2O.ai support ,NA
+R_0wu7Uus5pxwTcOZ,I have used tidymodels packages a few times,Q5_12,0,Other,NA
+R_BSdqFmArzloIhmp,I have used tidymodels packages a few times,Q5_1,0,Survival analysis,NA
+R_BSdqFmArzloIhmp,I have used tidymodels packages a few times,Q5_2,0,Support for sparse data structures,NA
+R_BSdqFmArzloIhmp,I have used tidymodels packages a few times,Q5_3,20,Adaptive resampling and better parallelization,NA
+R_BSdqFmArzloIhmp,I have used tidymodels packages a few times,Q5_4,25,"Model monitoring, updating, & organization",NA
+R_BSdqFmArzloIhmp,I have used tidymodels packages a few times,Q5_5,20,Translate prediction equations,NA
+R_BSdqFmArzloIhmp,I have used tidymodels packages a few times,Q5_6,0,Model stacking ,NA
+R_BSdqFmArzloIhmp,I have used tidymodels packages a few times,Q5_8,0,Post-processing in workflow(),NA
+R_BSdqFmArzloIhmp,I have used tidymodels packages a few times,Q5_9,0,Ignore recipe steps,NA
+R_BSdqFmArzloIhmp,I have used tidymodels packages a few times,Q5_10,35,H2O.ai support ,NA
+R_BSdqFmArzloIhmp,I have used tidymodels packages a few times,Q5_12,0,Other,NA
+R_vohAUA6HDkGSnmh,I have used tidymodels packages a few times,Q5_1,0,Survival analysis,NA
+R_vohAUA6HDkGSnmh,I have used tidymodels packages a few times,Q5_2,0,Support for sparse data structures,NA
+R_vohAUA6HDkGSnmh,I have used tidymodels packages a few times,Q5_3,0,Adaptive resampling and better parallelization,NA
+R_vohAUA6HDkGSnmh,I have used tidymodels packages a few times,Q5_4,0,"Model monitoring, updating, & organization",NA
+R_vohAUA6HDkGSnmh,I have used tidymodels packages a few times,Q5_5,20,Translate prediction equations,NA
+R_vohAUA6HDkGSnmh,I have used tidymodels packages a few times,Q5_6,10,Model stacking ,NA
+R_vohAUA6HDkGSnmh,I have used tidymodels packages a few times,Q5_8,0,Post-processing in workflow(),NA
+R_vohAUA6HDkGSnmh,I have used tidymodels packages a few times,Q5_9,0,Ignore recipe steps,NA
+R_vohAUA6HDkGSnmh,I have used tidymodels packages a few times,Q5_10,70,H2O.ai support ,NA
+R_vohAUA6HDkGSnmh,I have used tidymodels packages a few times,Q5_12,0,Other,NA
+R_yqDgrSGrt9E2M6J,I have used tidymodels packages a few times,Q5_1,25,Survival analysis,NA
+R_yqDgrSGrt9E2M6J,I have used tidymodels packages a few times,Q5_2,0,Support for sparse data structures,NA
+R_yqDgrSGrt9E2M6J,I have used tidymodels packages a few times,Q5_3,15,Adaptive resampling and better parallelization,NA
+R_yqDgrSGrt9E2M6J,I have used tidymodels packages a few times,Q5_4,0,"Model monitoring, updating, & organization",NA
+R_yqDgrSGrt9E2M6J,I have used tidymodels packages a few times,Q5_5,20,Translate prediction equations,NA
+R_yqDgrSGrt9E2M6J,I have used tidymodels packages a few times,Q5_6,10,Model stacking ,NA
+R_yqDgrSGrt9E2M6J,I have used tidymodels packages a few times,Q5_8,0,Post-processing in workflow(),NA
+R_yqDgrSGrt9E2M6J,I have used tidymodels packages a few times,Q5_9,0,Ignore recipe steps,NA
+R_yqDgrSGrt9E2M6J,I have used tidymodels packages a few times,Q5_10,30,H2O.ai support ,NA
+R_yqDgrSGrt9E2M6J,I have used tidymodels packages a few times,Q5_12,0,Other,NA
+R_2ux03iZZ4xo7e98,I have never used tidymodels,Q5_1,0,Survival analysis,NA
+R_2ux03iZZ4xo7e98,I have never used tidymodels,Q5_2,0,Support for sparse data structures,NA
+R_2ux03iZZ4xo7e98,I have never used tidymodels,Q5_3,0,Adaptive resampling and better parallelization,NA
+R_2ux03iZZ4xo7e98,I have never used tidymodels,Q5_4,0,"Model monitoring, updating, & organization",NA
+R_2ux03iZZ4xo7e98,I have never used tidymodels,Q5_5,0,Translate prediction equations,NA
+R_2ux03iZZ4xo7e98,I have never used tidymodels,Q5_6,100,Model stacking ,NA
+R_2ux03iZZ4xo7e98,I have never used tidymodels,Q5_8,0,Post-processing in workflow(),NA
+R_2ux03iZZ4xo7e98,I have never used tidymodels,Q5_9,0,Ignore recipe steps,NA
+R_2ux03iZZ4xo7e98,I have never used tidymodels,Q5_10,0,H2O.ai support ,NA
+R_2ux03iZZ4xo7e98,I have never used tidymodels,Q5_12,0,Other,NA
+R_1Ojbjg4rjDppIhE,I have used tidymodels packages many times,Q5_1,0,Survival analysis,NA
+R_1Ojbjg4rjDppIhE,I have used tidymodels packages many times,Q5_2,0,Support for sparse data structures,NA
+R_1Ojbjg4rjDppIhE,I have used tidymodels packages many times,Q5_3,0,Adaptive resampling and better parallelization,NA
+R_1Ojbjg4rjDppIhE,I have used tidymodels packages many times,Q5_4,30,"Model monitoring, updating, & organization",NA
+R_1Ojbjg4rjDppIhE,I have used tidymodels packages many times,Q5_5,0,Translate prediction equations,NA
+R_1Ojbjg4rjDppIhE,I have used tidymodels packages many times,Q5_6,15,Model stacking ,NA
+R_1Ojbjg4rjDppIhE,I have used tidymodels packages many times,Q5_8,15,Post-processing in workflow(),NA
+R_1Ojbjg4rjDppIhE,I have used tidymodels packages many times,Q5_9,0,Ignore recipe steps,NA
+R_1Ojbjg4rjDppIhE,I have used tidymodels packages many times,Q5_10,40,H2O.ai support ,NA
+R_1Ojbjg4rjDppIhE,I have used tidymodels packages many times,Q5_12,0,Other,NA
+R_2tGtlJi9Edt0OFj,I have used tidymodels packages a few times,Q5_1,0,Survival analysis,NA
+R_2tGtlJi9Edt0OFj,I have used tidymodels packages a few times,Q5_2,0,Support for sparse data structures,NA
+R_2tGtlJi9Edt0OFj,I have used tidymodels packages a few times,Q5_3,17,Adaptive resampling and better parallelization,NA
+R_2tGtlJi9Edt0OFj,I have used tidymodels packages a few times,Q5_4,0,"Model monitoring, updating, & organization",NA
+R_2tGtlJi9Edt0OFj,I have used tidymodels packages a few times,Q5_5,0,Translate prediction equations,NA
+R_2tGtlJi9Edt0OFj,I have used tidymodels packages a few times,Q5_6,33,Model stacking ,NA
+R_2tGtlJi9Edt0OFj,I have used tidymodels packages a few times,Q5_8,33,Post-processing in workflow(),NA
+R_2tGtlJi9Edt0OFj,I have used tidymodels packages a few times,Q5_9,0,Ignore recipe steps,NA
+R_2tGtlJi9Edt0OFj,I have used tidymodels packages a few times,Q5_10,17,H2O.ai support ,NA
+R_2tGtlJi9Edt0OFj,I have used tidymodels packages a few times,Q5_12,0,Other,NA
+R_3EBkEXQ9kCaOihq,I have used tidymodels packages a few times,Q5_1,10,Survival analysis,NA
+R_3EBkEXQ9kCaOihq,I have used tidymodels packages a few times,Q5_2,10,Support for sparse data structures,NA
+R_3EBkEXQ9kCaOihq,I have used tidymodels packages a few times,Q5_3,30,Adaptive resampling and better parallelization,NA
+R_3EBkEXQ9kCaOihq,I have used tidymodels packages a few times,Q5_4,20,"Model monitoring, updating, & organization",NA
+R_3EBkEXQ9kCaOihq,I have used tidymodels packages a few times,Q5_5,0,Translate prediction equations,NA
+R_3EBkEXQ9kCaOihq,I have used tidymodels packages a few times,Q5_6,20,Model stacking ,NA
+R_3EBkEXQ9kCaOihq,I have used tidymodels packages a few times,Q5_8,10,Post-processing in workflow(),NA
+R_3EBkEXQ9kCaOihq,I have used tidymodels packages a few times,Q5_9,0,Ignore recipe steps,NA
+R_3EBkEXQ9kCaOihq,I have used tidymodels packages a few times,Q5_10,0,H2O.ai support ,NA
+R_3EBkEXQ9kCaOihq,I have used tidymodels packages a few times,Q5_12,0,Other,NA
+R_2AXeqfqgLSrnyHr,I have used tidymodels packages a few times,Q5_1,0,Survival analysis,NA
+R_2AXeqfqgLSrnyHr,I have used tidymodels packages a few times,Q5_2,50,Support for sparse data structures,NA
+R_2AXeqfqgLSrnyHr,I have used tidymodels packages a few times,Q5_3,0,Adaptive resampling and better parallelization,NA
+R_2AXeqfqgLSrnyHr,I have used tidymodels packages a few times,Q5_4,0,"Model monitoring, updating, & organization",NA
+R_2AXeqfqgLSrnyHr,I have used tidymodels packages a few times,Q5_5,30,Translate prediction equations,NA
+R_2AXeqfqgLSrnyHr,I have used tidymodels packages a few times,Q5_6,0,Model stacking ,NA
+R_2AXeqfqgLSrnyHr,I have used tidymodels packages a few times,Q5_8,0,Post-processing in workflow(),NA
+R_2AXeqfqgLSrnyHr,I have used tidymodels packages a few times,Q5_9,0,Ignore recipe steps,NA
+R_2AXeqfqgLSrnyHr,I have used tidymodels packages a few times,Q5_10,20,H2O.ai support ,NA
+R_2AXeqfqgLSrnyHr,I have used tidymodels packages a few times,Q5_12,0,Other,NA
+R_2tumpnpndsaUvOb,I have used tidymodels packages many times,Q5_1,10,Survival analysis,NA
+R_2tumpnpndsaUvOb,I have used tidymodels packages many times,Q5_2,0,Support for sparse data structures,NA
+R_2tumpnpndsaUvOb,I have used tidymodels packages many times,Q5_3,0,Adaptive resampling and better parallelization,NA
+R_2tumpnpndsaUvOb,I have used tidymodels packages many times,Q5_4,0,"Model monitoring, updating, & organization",NA
+R_2tumpnpndsaUvOb,I have used tidymodels packages many times,Q5_5,0,Translate prediction equations,NA
+R_2tumpnpndsaUvOb,I have used tidymodels packages many times,Q5_6,0,Model stacking ,NA
+R_2tumpnpndsaUvOb,I have used tidymodels packages many times,Q5_8,0,Post-processing in workflow(),NA
+R_2tumpnpndsaUvOb,I have used tidymodels packages many times,Q5_9,0,Ignore recipe steps,NA
+R_2tumpnpndsaUvOb,I have used tidymodels packages many times,Q5_10,90,H2O.ai support ,NA
+R_2tumpnpndsaUvOb,I have used tidymodels packages many times,Q5_12,0,Other,NA
+R_3fNzpgilGmIzWI9,I have used tidymodels packages a few times,Q5_1,30,Survival analysis,NA
+R_3fNzpgilGmIzWI9,I have used tidymodels packages a few times,Q5_2,0,Support for sparse data structures,NA
+R_3fNzpgilGmIzWI9,I have used tidymodels packages a few times,Q5_3,0,Adaptive resampling and better parallelization,NA
+R_3fNzpgilGmIzWI9,I have used tidymodels packages a few times,Q5_4,0,"Model monitoring, updating, & organization",NA
+R_3fNzpgilGmIzWI9,I have used tidymodels packages a few times,Q5_5,0,Translate prediction equations,NA
+R_3fNzpgilGmIzWI9,I have used tidymodels packages a few times,Q5_6,20,Model stacking ,NA
+R_3fNzpgilGmIzWI9,I have used tidymodels packages a few times,Q5_8,50,Post-processing in workflow(),NA
+R_3fNzpgilGmIzWI9,I have used tidymodels packages a few times,Q5_9,0,Ignore recipe steps,NA
+R_3fNzpgilGmIzWI9,I have used tidymodels packages a few times,Q5_10,0,H2O.ai support ,NA
+R_3fNzpgilGmIzWI9,I have used tidymodels packages a few times,Q5_12,0,Other,NA
+R_1QZUmqKlfvfaOzL,I have contributed to tidymodels packages or taught others how to use them,Q5_1,0,Survival analysis,NA
+R_1QZUmqKlfvfaOzL,I have contributed to tidymodels packages or taught others how to use them,Q5_2,10,Support for sparse data structures,NA
+R_1QZUmqKlfvfaOzL,I have contributed to tidymodels packages or taught others how to use them,Q5_3,10,Adaptive resampling and better parallelization,NA
+R_1QZUmqKlfvfaOzL,I have contributed to tidymodels packages or taught others how to use them,Q5_4,10,"Model monitoring, updating, & organization",NA
+R_1QZUmqKlfvfaOzL,I have contributed to tidymodels packages or taught others how to use them,Q5_5,5,Translate prediction equations,NA
+R_1QZUmqKlfvfaOzL,I have contributed to tidymodels packages or taught others how to use them,Q5_6,5,Model stacking ,NA
+R_1QZUmqKlfvfaOzL,I have contributed to tidymodels packages or taught others how to use them,Q5_8,5,Post-processing in workflow(),NA
+R_1QZUmqKlfvfaOzL,I have contributed to tidymodels packages or taught others how to use them,Q5_9,5,Ignore recipe steps,NA
+R_1QZUmqKlfvfaOzL,I have contributed to tidymodels packages or taught others how to use them,Q5_10,3,H2O.ai support ,NA
+R_1QZUmqKlfvfaOzL,I have contributed to tidymodels packages or taught others how to use them,Q5_12,47,Other,Interpretable black-box models
+R_2t3XdLzFWWEIdu8,I have used tidymodels packages a few times,Q5_1,0,Survival analysis,NA
+R_2t3XdLzFWWEIdu8,I have used tidymodels packages a few times,Q5_2,0,Support for sparse data structures,NA
+R_2t3XdLzFWWEIdu8,I have used tidymodels packages a few times,Q5_3,20,Adaptive resampling and better parallelization,NA
+R_2t3XdLzFWWEIdu8,I have used tidymodels packages a few times,Q5_4,0,"Model monitoring, updating, & organization",NA
+R_2t3XdLzFWWEIdu8,I have used tidymodels packages a few times,Q5_5,0,Translate prediction equations,NA
+R_2t3XdLzFWWEIdu8,I have used tidymodels packages a few times,Q5_6,20,Model stacking ,NA
+R_2t3XdLzFWWEIdu8,I have used tidymodels packages a few times,Q5_8,0,Post-processing in workflow(),NA
+R_2t3XdLzFWWEIdu8,I have used tidymodels packages a few times,Q5_9,0,Ignore recipe steps,NA
+R_2t3XdLzFWWEIdu8,I have used tidymodels packages a few times,Q5_10,60,H2O.ai support ,NA
+R_2t3XdLzFWWEIdu8,I have used tidymodels packages a few times,Q5_12,0,Other,NA
+R_1rlaKiWAUSKm2xZ,I have used tidymodels packages a few times,Q5_1,0,Survival analysis,NA
+R_1rlaKiWAUSKm2xZ,I have used tidymodels packages a few times,Q5_2,0,Support for sparse data structures,NA
+R_1rlaKiWAUSKm2xZ,I have used tidymodels packages a few times,Q5_3,60,Adaptive resampling and better parallelization,NA
+R_1rlaKiWAUSKm2xZ,I have used tidymodels packages a few times,Q5_4,20,"Model monitoring, updating, & organization",NA
+R_1rlaKiWAUSKm2xZ,I have used tidymodels packages a few times,Q5_5,0,Translate prediction equations,NA
+R_1rlaKiWAUSKm2xZ,I have used tidymodels packages a few times,Q5_6,10,Model stacking ,NA
+R_1rlaKiWAUSKm2xZ,I have used tidymodels packages a few times,Q5_8,0,Post-processing in workflow(),NA
+R_1rlaKiWAUSKm2xZ,I have used tidymodels packages a few times,Q5_9,0,Ignore recipe steps,NA
+R_1rlaKiWAUSKm2xZ,I have used tidymodels packages a few times,Q5_10,10,H2O.ai support ,NA
+R_1rlaKiWAUSKm2xZ,I have used tidymodels packages a few times,Q5_12,0,Other,NA
+R_2du38o4PpAscVGQ,I have never used tidymodels,Q5_1,20,Survival analysis,NA
+R_2du38o4PpAscVGQ,I have never used tidymodels,Q5_2,10,Support for sparse data structures,NA
+R_2du38o4PpAscVGQ,I have never used tidymodels,Q5_3,15,Adaptive resampling and better parallelization,NA
+R_2du38o4PpAscVGQ,I have never used tidymodels,Q5_4,5,"Model monitoring, updating, & organization",NA
+R_2du38o4PpAscVGQ,I have never used tidymodels,Q5_5,15,Translate prediction equations,NA
+R_2du38o4PpAscVGQ,I have never used tidymodels,Q5_6,15,Model stacking ,NA
+R_2du38o4PpAscVGQ,I have never used tidymodels,Q5_8,5,Post-processing in workflow(),NA
+R_2du38o4PpAscVGQ,I have never used tidymodels,Q5_9,10,Ignore recipe steps,NA
+R_2du38o4PpAscVGQ,I have never used tidymodels,Q5_10,5,H2O.ai support ,NA
+R_2du38o4PpAscVGQ,I have never used tidymodels,Q5_12,0,Other,NA
+R_DqVdyxMLjqmW3sd,I have used tidymodels packages many times,Q5_1,0,Survival analysis,NA
+R_DqVdyxMLjqmW3sd,I have used tidymodels packages many times,Q5_2,40,Support for sparse data structures,NA
+R_DqVdyxMLjqmW3sd,I have used tidymodels packages many times,Q5_3,20,Adaptive resampling and better parallelization,NA
+R_DqVdyxMLjqmW3sd,I have used tidymodels packages many times,Q5_4,20,"Model monitoring, updating, & organization",NA
+R_DqVdyxMLjqmW3sd,I have used tidymodels packages many times,Q5_5,0,Translate prediction equations,NA
+R_DqVdyxMLjqmW3sd,I have used tidymodels packages many times,Q5_6,0,Model stacking ,NA
+R_DqVdyxMLjqmW3sd,I have used tidymodels packages many times,Q5_8,20,Post-processing in workflow(),NA
+R_DqVdyxMLjqmW3sd,I have used tidymodels packages many times,Q5_9,0,Ignore recipe steps,NA
+R_DqVdyxMLjqmW3sd,I have used tidymodels packages many times,Q5_10,0,H2O.ai support ,NA
+R_DqVdyxMLjqmW3sd,I have used tidymodels packages many times,Q5_12,0,Other,NA
+R_22mrJ1XTADzuwJ2,I have used tidymodels packages a few times,Q5_1,30,Survival analysis,NA
+R_22mrJ1XTADzuwJ2,I have used tidymodels packages a few times,Q5_2,0,Support for sparse data structures,NA
+R_22mrJ1XTADzuwJ2,I have used tidymodels packages a few times,Q5_3,0,Adaptive resampling and better parallelization,NA
+R_22mrJ1XTADzuwJ2,I have used tidymodels packages a few times,Q5_4,0,"Model monitoring, updating, & organization",NA
+R_22mrJ1XTADzuwJ2,I have used tidymodels packages a few times,Q5_5,0,Translate prediction equations,NA
+R_22mrJ1XTADzuwJ2,I have used tidymodels packages a few times,Q5_6,0,Model stacking ,NA
+R_22mrJ1XTADzuwJ2,I have used tidymodels packages a few times,Q5_8,20,Post-processing in workflow(),NA
+R_22mrJ1XTADzuwJ2,I have used tidymodels packages a few times,Q5_9,0,Ignore recipe steps,NA
+R_22mrJ1XTADzuwJ2,I have used tidymodels packages a few times,Q5_10,0,H2O.ai support ,NA
+R_22mrJ1XTADzuwJ2,I have used tidymodels packages a few times,Q5_12,50,Other,create nice looking tables for html/pdf/docx output
+R_3JsW8KZ3RnoI8l9,I have never used tidymodels,Q5_1,0,Survival analysis,NA
+R_3JsW8KZ3RnoI8l9,I have never used tidymodels,Q5_2,0,Support for sparse data structures,NA
+R_3JsW8KZ3RnoI8l9,I have never used tidymodels,Q5_3,0,Adaptive resampling and better parallelization,NA
+R_3JsW8KZ3RnoI8l9,I have never used tidymodels,Q5_4,0,"Model monitoring, updating, & organization",NA
+R_3JsW8KZ3RnoI8l9,I have never used tidymodels,Q5_5,0,Translate prediction equations,NA
+R_3JsW8KZ3RnoI8l9,I have never used tidymodels,Q5_6,0,Model stacking ,NA
+R_3JsW8KZ3RnoI8l9,I have never used tidymodels,Q5_8,0,Post-processing in workflow(),NA
+R_3JsW8KZ3RnoI8l9,I have never used tidymodels,Q5_9,0,Ignore recipe steps,NA
+R_3JsW8KZ3RnoI8l9,I have never used tidymodels,Q5_10,0,H2O.ai support ,NA
+R_3JsW8KZ3RnoI8l9,I have never used tidymodels,Q5_12,100,Other,Spatial resampling
+R_RzaIm1NRRKXumqd,I have used tidymodels packages a few times,Q5_1,30,Survival analysis,NA
+R_RzaIm1NRRKXumqd,I have used tidymodels packages a few times,Q5_2,0,Support for sparse data structures,NA
+R_RzaIm1NRRKXumqd,I have used tidymodels packages a few times,Q5_3,20,Adaptive resampling and better parallelization,NA
+R_RzaIm1NRRKXumqd,I have used tidymodels packages a few times,Q5_4,50,"Model monitoring, updating, & organization",NA
+R_RzaIm1NRRKXumqd,I have used tidymodels packages a few times,Q5_5,0,Translate prediction equations,NA
+R_RzaIm1NRRKXumqd,I have used tidymodels packages a few times,Q5_6,0,Model stacking ,NA
+R_RzaIm1NRRKXumqd,I have used tidymodels packages a few times,Q5_8,0,Post-processing in workflow(),NA
+R_RzaIm1NRRKXumqd,I have used tidymodels packages a few times,Q5_9,0,Ignore recipe steps,NA
+R_RzaIm1NRRKXumqd,I have used tidymodels packages a few times,Q5_10,0,H2O.ai support ,NA
+R_RzaIm1NRRKXumqd,I have used tidymodels packages a few times,Q5_12,0,Other,NA
+R_qVH8E3AulEIHSkp,I have used tidymodels packages many times,Q5_1,0,Survival analysis,NA
+R_qVH8E3AulEIHSkp,I have used tidymodels packages many times,Q5_2,0,Support for sparse data structures,NA
+R_qVH8E3AulEIHSkp,I have used tidymodels packages many times,Q5_3,0,Adaptive resampling and better parallelization,NA
+R_qVH8E3AulEIHSkp,I have used tidymodels packages many times,Q5_4,0,"Model monitoring, updating, & organization",NA
+R_qVH8E3AulEIHSkp,I have used tidymodels packages many times,Q5_5,0,Translate prediction equations,NA
+R_qVH8E3AulEIHSkp,I have used tidymodels packages many times,Q5_6,0,Model stacking ,NA
+R_qVH8E3AulEIHSkp,I have used tidymodels packages many times,Q5_8,0,Post-processing in workflow(),NA
+R_qVH8E3AulEIHSkp,I have used tidymodels packages many times,Q5_9,0,Ignore recipe steps,NA
+R_qVH8E3AulEIHSkp,I have used tidymodels packages many times,Q5_10,0,H2O.ai support ,NA
+R_qVH8E3AulEIHSkp,I have used tidymodels packages many times,Q5_12,100,Other,NA
+R_3nk3xQohFVPtl03,I have used tidymodels packages a few times,Q5_1,0,Survival analysis,NA
+R_3nk3xQohFVPtl03,I have used tidymodels packages a few times,Q5_2,0,Support for sparse data structures,NA
+R_3nk3xQohFVPtl03,I have used tidymodels packages a few times,Q5_3,0,Adaptive resampling and better parallelization,NA
+R_3nk3xQohFVPtl03,I have used tidymodels packages a few times,Q5_4,100,"Model monitoring, updating, & organization",NA
+R_3nk3xQohFVPtl03,I have used tidymodels packages a few times,Q5_5,0,Translate prediction equations,NA
+R_3nk3xQohFVPtl03,I have used tidymodels packages a few times,Q5_6,0,Model stacking ,NA
+R_3nk3xQohFVPtl03,I have used tidymodels packages a few times,Q5_8,0,Post-processing in workflow(),NA
+R_3nk3xQohFVPtl03,I have used tidymodels packages a few times,Q5_9,0,Ignore recipe steps,NA
+R_3nk3xQohFVPtl03,I have used tidymodels packages a few times,Q5_10,0,H2O.ai support ,NA
+R_3nk3xQohFVPtl03,I have used tidymodels packages a few times,Q5_12,0,Other,NA
+R_0TGl0XtJNkIbItj,I have used tidymodels packages many times,Q5_1,0,Survival analysis,NA
+R_0TGl0XtJNkIbItj,I have used tidymodels packages many times,Q5_2,10,Support for sparse data structures,NA
+R_0TGl0XtJNkIbItj,I have used tidymodels packages many times,Q5_3,20,Adaptive resampling and better parallelization,NA
+R_0TGl0XtJNkIbItj,I have used tidymodels packages many times,Q5_4,10,"Model monitoring, updating, & organization",NA
+R_0TGl0XtJNkIbItj,I have used tidymodels packages many times,Q5_5,0,Translate prediction equations,NA
+R_0TGl0XtJNkIbItj,I have used tidymodels packages many times,Q5_6,50,Model stacking ,NA
+R_0TGl0XtJNkIbItj,I have used tidymodels packages many times,Q5_8,10,Post-processing in workflow(),NA
+R_0TGl0XtJNkIbItj,I have used tidymodels packages many times,Q5_9,0,Ignore recipe steps,NA
+R_0TGl0XtJNkIbItj,I have used tidymodels packages many times,Q5_10,0,H2O.ai support ,NA
+R_0TGl0XtJNkIbItj,I have used tidymodels packages many times,Q5_12,0,Other,NA
+R_1DHajmJGwLqjNRH,I have used tidymodels packages a few times,Q5_1,0,Survival analysis,NA
+R_1DHajmJGwLqjNRH,I have used tidymodels packages a few times,Q5_2,0,Support for sparse data structures,NA
+R_1DHajmJGwLqjNRH,I have used tidymodels packages a few times,Q5_3,30,Adaptive resampling and better parallelization,NA
+R_1DHajmJGwLqjNRH,I have used tidymodels packages a few times,Q5_4,0,"Model monitoring, updating, & organization",NA
+R_1DHajmJGwLqjNRH,I have used tidymodels packages a few times,Q5_5,0,Translate prediction equations,NA
+R_1DHajmJGwLqjNRH,I have used tidymodels packages a few times,Q5_6,30,Model stacking ,NA
+R_1DHajmJGwLqjNRH,I have used tidymodels packages a few times,Q5_8,0,Post-processing in workflow(),NA
+R_1DHajmJGwLqjNRH,I have used tidymodels packages a few times,Q5_9,0,Ignore recipe steps,NA
+R_1DHajmJGwLqjNRH,I have used tidymodels packages a few times,Q5_10,40,H2O.ai support ,NA
+R_1DHajmJGwLqjNRH,I have used tidymodels packages a few times,Q5_12,0,Other,NA
+R_u85NLyhovyhFhZv,I have used tidymodels packages a few times,Q5_1,0,Survival analysis,NA
+R_u85NLyhovyhFhZv,I have used tidymodels packages a few times,Q5_2,0,Support for sparse data structures,NA
+R_u85NLyhovyhFhZv,I have used tidymodels packages a few times,Q5_3,20,Adaptive resampling and better parallelization,NA
+R_u85NLyhovyhFhZv,I have used tidymodels packages a few times,Q5_4,30,"Model monitoring, updating, & organization",NA
+R_u85NLyhovyhFhZv,I have used tidymodels packages a few times,Q5_5,30,Translate prediction equations,NA
+R_u85NLyhovyhFhZv,I have used tidymodels packages a few times,Q5_6,10,Model stacking ,NA
+R_u85NLyhovyhFhZv,I have used tidymodels packages a few times,Q5_8,0,Post-processing in workflow(),NA
+R_u85NLyhovyhFhZv,I have used tidymodels packages a few times,Q5_9,0,Ignore recipe steps,NA
+R_u85NLyhovyhFhZv,I have used tidymodels packages a few times,Q5_10,10,H2O.ai support ,NA
+R_u85NLyhovyhFhZv,I have used tidymodels packages a few times,Q5_12,0,Other,NA
+R_Y3yLOI3VjxLJpqp,I have used tidymodels packages a few times,Q5_1,0,Survival analysis,NA
+R_Y3yLOI3VjxLJpqp,I have used tidymodels packages a few times,Q5_2,0,Support for sparse data structures,NA
+R_Y3yLOI3VjxLJpqp,I have used tidymodels packages a few times,Q5_3,25,Adaptive resampling and better parallelization,NA
+R_Y3yLOI3VjxLJpqp,I have used tidymodels packages a few times,Q5_4,0,"Model monitoring, updating, & organization",NA
+R_Y3yLOI3VjxLJpqp,I have used tidymodels packages a few times,Q5_5,25,Translate prediction equations,NA
+R_Y3yLOI3VjxLJpqp,I have used tidymodels packages a few times,Q5_6,25,Model stacking ,NA
+R_Y3yLOI3VjxLJpqp,I have used tidymodels packages a few times,Q5_8,0,Post-processing in workflow(),NA
+R_Y3yLOI3VjxLJpqp,I have used tidymodels packages a few times,Q5_9,25,Ignore recipe steps,NA
+R_Y3yLOI3VjxLJpqp,I have used tidymodels packages a few times,Q5_10,0,H2O.ai support ,NA
+R_Y3yLOI3VjxLJpqp,I have used tidymodels packages a few times,Q5_12,0,Other,NA
+R_1QzvviID3hy6Rlb,I have used tidymodels packages many times,Q5_1,50,Survival analysis,NA
+R_1QzvviID3hy6Rlb,I have used tidymodels packages many times,Q5_2,0,Support for sparse data structures,NA
+R_1QzvviID3hy6Rlb,I have used tidymodels packages many times,Q5_3,0,Adaptive resampling and better parallelization,NA
+R_1QzvviID3hy6Rlb,I have used tidymodels packages many times,Q5_4,0,"Model monitoring, updating, & organization",NA
+R_1QzvviID3hy6Rlb,I have used tidymodels packages many times,Q5_5,0,Translate prediction equations,NA
+R_1QzvviID3hy6Rlb,I have used tidymodels packages many times,Q5_6,0,Model stacking ,NA
+R_1QzvviID3hy6Rlb,I have used tidymodels packages many times,Q5_8,0,Post-processing in workflow(),NA
+R_1QzvviID3hy6Rlb,I have used tidymodels packages many times,Q5_9,0,Ignore recipe steps,NA
+R_1QzvviID3hy6Rlb,I have used tidymodels packages many times,Q5_10,50,H2O.ai support ,NA
+R_1QzvviID3hy6Rlb,I have used tidymodels packages many times,Q5_12,0,Other,NA
+R_1C8YU0YyNvMmaj7,I have used tidymodels packages a few times,Q5_1,0,Survival analysis,NA
+R_1C8YU0YyNvMmaj7,I have used tidymodels packages a few times,Q5_2,10,Support for sparse data structures,NA
+R_1C8YU0YyNvMmaj7,I have used tidymodels packages a few times,Q5_3,30,Adaptive resampling and better parallelization,NA
+R_1C8YU0YyNvMmaj7,I have used tidymodels packages a few times,Q5_4,30,"Model monitoring, updating, & organization",NA
+R_1C8YU0YyNvMmaj7,I have used tidymodels packages a few times,Q5_5,0,Translate prediction equations,NA
+R_1C8YU0YyNvMmaj7,I have used tidymodels packages a few times,Q5_6,20,Model stacking ,NA
+R_1C8YU0YyNvMmaj7,I have used tidymodels packages a few times,Q5_8,0,Post-processing in workflow(),NA
+R_1C8YU0YyNvMmaj7,I have used tidymodels packages a few times,Q5_9,10,Ignore recipe steps,NA
+R_1C8YU0YyNvMmaj7,I have used tidymodels packages a few times,Q5_10,0,H2O.ai support ,NA
+R_1C8YU0YyNvMmaj7,I have used tidymodels packages a few times,Q5_12,0,Other,NA
+R_2S7TLDcnrgWdHuO,I have used tidymodels packages a few times,Q5_1,10,Survival analysis,NA
+R_2S7TLDcnrgWdHuO,I have used tidymodels packages a few times,Q5_2,20,Support for sparse data structures,NA
+R_2S7TLDcnrgWdHuO,I have used tidymodels packages a few times,Q5_3,20,Adaptive resampling and better parallelization,NA
+R_2S7TLDcnrgWdHuO,I have used tidymodels packages a few times,Q5_4,0,"Model monitoring, updating, & organization",NA
+R_2S7TLDcnrgWdHuO,I have used tidymodels packages a few times,Q5_5,0,Translate prediction equations,NA
+R_2S7TLDcnrgWdHuO,I have used tidymodels packages a few times,Q5_6,20,Model stacking ,NA
+R_2S7TLDcnrgWdHuO,I have used tidymodels packages a few times,Q5_8,10,Post-processing in workflow(),NA
+R_2S7TLDcnrgWdHuO,I have used tidymodels packages a few times,Q5_9,0,Ignore recipe steps,NA
+R_2S7TLDcnrgWdHuO,I have used tidymodels packages a few times,Q5_10,5,H2O.ai support ,NA
+R_2S7TLDcnrgWdHuO,I have used tidymodels packages a few times,Q5_12,15,Other,Documentation and examples for different models.
+R_A1l6NgTPLMrBXQB,I have used tidymodels packages many times,Q5_1,0,Survival analysis,NA
+R_A1l6NgTPLMrBXQB,I have used tidymodels packages many times,Q5_2,0,Support for sparse data structures,NA
+R_A1l6NgTPLMrBXQB,I have used tidymodels packages many times,Q5_3,20,Adaptive resampling and better parallelization,NA
+R_A1l6NgTPLMrBXQB,I have used tidymodels packages many times,Q5_4,15,"Model monitoring, updating, & organization",NA
+R_A1l6NgTPLMrBXQB,I have used tidymodels packages many times,Q5_5,0,Translate prediction equations,NA
+R_A1l6NgTPLMrBXQB,I have used tidymodels packages many times,Q5_6,0,Model stacking ,NA
+R_A1l6NgTPLMrBXQB,I have used tidymodels packages many times,Q5_8,20,Post-processing in workflow(),NA
+R_A1l6NgTPLMrBXQB,I have used tidymodels packages many times,Q5_9,0,Ignore recipe steps,NA
+R_A1l6NgTPLMrBXQB,I have used tidymodels packages many times,Q5_10,5,H2O.ai support ,NA
+R_A1l6NgTPLMrBXQB,I have used tidymodels packages many times,Q5_12,40,Other,Support case weights
+R_3COS7iPCvcux9TJ,I have used tidymodels packages many times,Q5_1,10,Survival analysis,NA
+R_3COS7iPCvcux9TJ,I have used tidymodels packages many times,Q5_2,10,Support for sparse data structures,NA
+R_3COS7iPCvcux9TJ,I have used tidymodels packages many times,Q5_3,10,Adaptive resampling and better parallelization,NA
+R_3COS7iPCvcux9TJ,I have used tidymodels packages many times,Q5_4,10,"Model monitoring, updating, & organization",NA
+R_3COS7iPCvcux9TJ,I have used tidymodels packages many times,Q5_5,10,Translate prediction equations,NA
+R_3COS7iPCvcux9TJ,I have used tidymodels packages many times,Q5_6,20,Model stacking ,NA
+R_3COS7iPCvcux9TJ,I have used tidymodels packages many times,Q5_8,10,Post-processing in workflow(),NA
+R_3COS7iPCvcux9TJ,I have used tidymodels packages many times,Q5_9,0,Ignore recipe steps,NA
+R_3COS7iPCvcux9TJ,I have used tidymodels packages many times,Q5_10,20,H2O.ai support ,NA
+R_3COS7iPCvcux9TJ,I have used tidymodels packages many times,Q5_12,0,Other,NA
+R_2cilDcQzghlfN5K,I have used tidymodels packages a few times,Q5_1,0,Survival analysis,NA
+R_2cilDcQzghlfN5K,I have used tidymodels packages a few times,Q5_2,0,Support for sparse data structures,NA
+R_2cilDcQzghlfN5K,I have used tidymodels packages a few times,Q5_3,35,Adaptive resampling and better parallelization,NA
+R_2cilDcQzghlfN5K,I have used tidymodels packages a few times,Q5_4,20,"Model monitoring, updating, & organization",NA
+R_2cilDcQzghlfN5K,I have used tidymodels packages a few times,Q5_5,19,Translate prediction equations,NA
+R_2cilDcQzghlfN5K,I have used tidymodels packages a few times,Q5_6,8,Model stacking ,NA
+R_2cilDcQzghlfN5K,I have used tidymodels packages a few times,Q5_8,0,Post-processing in workflow(),NA
+R_2cilDcQzghlfN5K,I have used tidymodels packages a few times,Q5_9,0,Ignore recipe steps,NA
+R_2cilDcQzghlfN5K,I have used tidymodels packages a few times,Q5_10,18,H2O.ai support ,NA
+R_2cilDcQzghlfN5K,I have used tidymodels packages a few times,Q5_12,0,Other,NA
+R_2uDnmHJnvuYEDqK,I have used tidymodels packages many times,Q5_1,0,Survival analysis,NA
+R_2uDnmHJnvuYEDqK,I have used tidymodels packages many times,Q5_2,0,Support for sparse data structures,NA
+R_2uDnmHJnvuYEDqK,I have used tidymodels packages many times,Q5_3,0,Adaptive resampling and better parallelization,NA
+R_2uDnmHJnvuYEDqK,I have used tidymodels packages many times,Q5_4,0,"Model monitoring, updating, & organization",NA
+R_2uDnmHJnvuYEDqK,I have used tidymodels packages many times,Q5_5,3,Translate prediction equations,NA
+R_2uDnmHJnvuYEDqK,I have used tidymodels packages many times,Q5_6,20,Model stacking ,NA
+R_2uDnmHJnvuYEDqK,I have used tidymodels packages many times,Q5_8,75,Post-processing in workflow(),NA
+R_2uDnmHJnvuYEDqK,I have used tidymodels packages many times,Q5_9,2,Ignore recipe steps,NA
+R_2uDnmHJnvuYEDqK,I have used tidymodels packages many times,Q5_10,0,H2O.ai support ,NA
+R_2uDnmHJnvuYEDqK,I have used tidymodels packages many times,Q5_12,0,Other,NA
+R_3pco6TWDdMUVpon,I have contributed to tidymodels packages or taught others how to use them,Q5_1,0,Survival analysis,NA
+R_3pco6TWDdMUVpon,I have contributed to tidymodels packages or taught others how to use them,Q5_2,0,Support for sparse data structures,NA
+R_3pco6TWDdMUVpon,I have contributed to tidymodels packages or taught others how to use them,Q5_3,20,Adaptive resampling and better parallelization,NA
+R_3pco6TWDdMUVpon,I have contributed to tidymodels packages or taught others how to use them,Q5_4,30,"Model monitoring, updating, & organization",NA
+R_3pco6TWDdMUVpon,I have contributed to tidymodels packages or taught others how to use them,Q5_5,15,Translate prediction equations,NA
+R_3pco6TWDdMUVpon,I have contributed to tidymodels packages or taught others how to use them,Q5_6,0,Model stacking ,NA
+R_3pco6TWDdMUVpon,I have contributed to tidymodels packages or taught others how to use them,Q5_8,30,Post-processing in workflow(),NA
+R_3pco6TWDdMUVpon,I have contributed to tidymodels packages or taught others how to use them,Q5_9,5,Ignore recipe steps,NA
+R_3pco6TWDdMUVpon,I have contributed to tidymodels packages or taught others how to use them,Q5_10,0,H2O.ai support ,NA
+R_3pco6TWDdMUVpon,I have contributed to tidymodels packages or taught others how to use them,Q5_12,0,Other,NA
+R_BwTVjo9k2I28fGF,I have used tidymodels packages a few times,Q5_1,0,Survival analysis,NA
+R_BwTVjo9k2I28fGF,I have used tidymodels packages a few times,Q5_2,0,Support for sparse data structures,NA
+R_BwTVjo9k2I28fGF,I have used tidymodels packages a few times,Q5_3,20,Adaptive resampling and better parallelization,NA
+R_BwTVjo9k2I28fGF,I have used tidymodels packages a few times,Q5_4,0,"Model monitoring, updating, & organization",NA
+R_BwTVjo9k2I28fGF,I have used tidymodels packages a few times,Q5_5,30,Translate prediction equations,NA
+R_BwTVjo9k2I28fGF,I have used tidymodels packages a few times,Q5_6,10,Model stacking ,NA
+R_BwTVjo9k2I28fGF,I have used tidymodels packages a few times,Q5_8,0,Post-processing in workflow(),NA
+R_BwTVjo9k2I28fGF,I have used tidymodels packages a few times,Q5_9,0,Ignore recipe steps,NA
+R_BwTVjo9k2I28fGF,I have used tidymodels packages a few times,Q5_10,40,H2O.ai support ,NA
+R_BwTVjo9k2I28fGF,I have used tidymodels packages a few times,Q5_12,0,Other,NA
+R_3NVrTRjMxuxbou8,I have used tidymodels packages many times,Q5_1,10,Survival analysis,NA
+R_3NVrTRjMxuxbou8,I have used tidymodels packages many times,Q5_2,5,Support for sparse data structures,NA
+R_3NVrTRjMxuxbou8,I have used tidymodels packages many times,Q5_3,5,Adaptive resampling and better parallelization,NA
+R_3NVrTRjMxuxbou8,I have used tidymodels packages many times,Q5_4,23,"Model monitoring, updating, & organization",NA
+R_3NVrTRjMxuxbou8,I have used tidymodels packages many times,Q5_5,25,Translate prediction equations,NA
+R_3NVrTRjMxuxbou8,I have used tidymodels packages many times,Q5_6,1,Model stacking ,NA
+R_3NVrTRjMxuxbou8,I have used tidymodels packages many times,Q5_8,8,Post-processing in workflow(),NA
+R_3NVrTRjMxuxbou8,I have used tidymodels packages many times,Q5_9,2,Ignore recipe steps,NA
+R_3NVrTRjMxuxbou8,I have used tidymodels packages many times,Q5_10,21,H2O.ai support ,NA
+R_3NVrTRjMxuxbou8,I have used tidymodels packages many times,Q5_12,0,Other,NA
+R_2ctOFcORhmB4yDS,I have used tidymodels packages a few times,Q5_1,10,Survival analysis,NA
+R_2ctOFcORhmB4yDS,I have used tidymodels packages a few times,Q5_2,0,Support for sparse data structures,NA
+R_2ctOFcORhmB4yDS,I have used tidymodels packages a few times,Q5_3,0,Adaptive resampling and better parallelization,NA
+R_2ctOFcORhmB4yDS,I have used tidymodels packages a few times,Q5_4,20,"Model monitoring, updating, & organization",NA
+R_2ctOFcORhmB4yDS,I have used tidymodels packages a few times,Q5_5,0,Translate prediction equations,NA
+R_2ctOFcORhmB4yDS,I have used tidymodels packages a few times,Q5_6,0,Model stacking ,NA
+R_2ctOFcORhmB4yDS,I have used tidymodels packages a few times,Q5_8,20,Post-processing in workflow(),NA
+R_2ctOFcORhmB4yDS,I have used tidymodels packages a few times,Q5_9,0,Ignore recipe steps,NA
+R_2ctOFcORhmB4yDS,I have used tidymodels packages a few times,Q5_10,0,H2O.ai support ,NA
+R_2ctOFcORhmB4yDS,I have used tidymodels packages a few times,Q5_12,50,Other,mixed effects (lme4 style)
+R_2pWaI6NoRkE03Qx,I have contributed to tidymodels packages or taught others how to use them,Q5_1,0,Survival analysis,NA
+R_2pWaI6NoRkE03Qx,I have contributed to tidymodels packages or taught others how to use them,Q5_2,0,Support for sparse data structures,NA
+R_2pWaI6NoRkE03Qx,I have contributed to tidymodels packages or taught others how to use them,Q5_3,0,Adaptive resampling and better parallelization,NA
+R_2pWaI6NoRkE03Qx,I have contributed to tidymodels packages or taught others how to use them,Q5_4,0,"Model monitoring, updating, & organization",NA
+R_2pWaI6NoRkE03Qx,I have contributed to tidymodels packages or taught others how to use them,Q5_5,10,Translate prediction equations,NA
+R_2pWaI6NoRkE03Qx,I have contributed to tidymodels packages or taught others how to use them,Q5_6,50,Model stacking ,NA
+R_2pWaI6NoRkE03Qx,I have contributed to tidymodels packages or taught others how to use them,Q5_8,10,Post-processing in workflow(),NA
+R_2pWaI6NoRkE03Qx,I have contributed to tidymodels packages or taught others how to use them,Q5_9,0,Ignore recipe steps,NA
+R_2pWaI6NoRkE03Qx,I have contributed to tidymodels packages or taught others how to use them,Q5_10,20,H2O.ai support ,NA
+R_2pWaI6NoRkE03Qx,I have contributed to tidymodels packages or taught others how to use them,Q5_12,10,Other,free beer for the tidymodels team
+R_22KfwdvGxcbFOjx,I have used tidymodels packages many times,Q5_1,0,Survival analysis,NA
+R_22KfwdvGxcbFOjx,I have used tidymodels packages many times,Q5_2,0,Support for sparse data structures,NA
+R_22KfwdvGxcbFOjx,I have used tidymodels packages many times,Q5_3,0,Adaptive resampling and better parallelization,NA
+R_22KfwdvGxcbFOjx,I have used tidymodels packages many times,Q5_4,35,"Model monitoring, updating, & organization",NA
+R_22KfwdvGxcbFOjx,I have used tidymodels packages many times,Q5_5,45,Translate prediction equations,NA
+R_22KfwdvGxcbFOjx,I have used tidymodels packages many times,Q5_6,10,Model stacking ,NA
+R_22KfwdvGxcbFOjx,I have used tidymodels packages many times,Q5_8,0,Post-processing in workflow(),NA
+R_22KfwdvGxcbFOjx,I have used tidymodels packages many times,Q5_9,10,Ignore recipe steps,NA
+R_22KfwdvGxcbFOjx,I have used tidymodels packages many times,Q5_10,0,H2O.ai support ,NA
+R_22KfwdvGxcbFOjx,I have used tidymodels packages many times,Q5_12,0,Other,NA
+R_wNw8Vz5YLLOUIPD,I have used tidymodels packages a few times,Q5_1,55,Survival analysis,NA
+R_wNw8Vz5YLLOUIPD,I have used tidymodels packages a few times,Q5_2,5,Support for sparse data structures,NA
+R_wNw8Vz5YLLOUIPD,I have used tidymodels packages a few times,Q5_3,10,Adaptive resampling and better parallelization,NA
+R_wNw8Vz5YLLOUIPD,I have used tidymodels packages a few times,Q5_4,5,"Model monitoring, updating, & organization",NA
+R_wNw8Vz5YLLOUIPD,I have used tidymodels packages a few times,Q5_5,5,Translate prediction equations,NA
+R_wNw8Vz5YLLOUIPD,I have used tidymodels packages a few times,Q5_6,5,Model stacking ,NA
+R_wNw8Vz5YLLOUIPD,I have used tidymodels packages a few times,Q5_8,5,Post-processing in workflow(),NA
+R_wNw8Vz5YLLOUIPD,I have used tidymodels packages a few times,Q5_9,5,Ignore recipe steps,NA
+R_wNw8Vz5YLLOUIPD,I have used tidymodels packages a few times,Q5_10,5,H2O.ai support ,NA
+R_wNw8Vz5YLLOUIPD,I have used tidymodels packages a few times,Q5_12,0,Other,NA
+R_1iaseEQwkKoXfRs,I have used tidymodels packages a few times,Q5_1,20,Survival analysis,NA
+R_1iaseEQwkKoXfRs,I have used tidymodels packages a few times,Q5_2,20,Support for sparse data structures,NA
+R_1iaseEQwkKoXfRs,I have used tidymodels packages a few times,Q5_3,0,Adaptive resampling and better parallelization,NA
+R_1iaseEQwkKoXfRs,I have used tidymodels packages a few times,Q5_4,15,"Model monitoring, updating, & organization",NA
+R_1iaseEQwkKoXfRs,I have used tidymodels packages a few times,Q5_5,10,Translate prediction equations,NA
+R_1iaseEQwkKoXfRs,I have used tidymodels packages a few times,Q5_6,0,Model stacking ,NA
+R_1iaseEQwkKoXfRs,I have used tidymodels packages a few times,Q5_8,0,Post-processing in workflow(),NA
+R_1iaseEQwkKoXfRs,I have used tidymodels packages a few times,Q5_9,0,Ignore recipe steps,NA
+R_1iaseEQwkKoXfRs,I have used tidymodels packages a few times,Q5_10,0,H2O.ai support ,NA
+R_1iaseEQwkKoXfRs,I have used tidymodels packages a few times,Q5_12,35,Other,econometric methods
+R_3P62QyJPa6IXKY1,I have never used tidymodels,Q5_1,30,Survival analysis,NA
+R_3P62QyJPa6IXKY1,I have never used tidymodels,Q5_2,0,Support for sparse data structures,NA
+R_3P62QyJPa6IXKY1,I have never used tidymodels,Q5_3,30,Adaptive resampling and better parallelization,NA
+R_3P62QyJPa6IXKY1,I have never used tidymodels,Q5_4,0,"Model monitoring, updating, & organization",NA
+R_3P62QyJPa6IXKY1,I have never used tidymodels,Q5_5,0,Translate prediction equations,NA
+R_3P62QyJPa6IXKY1,I have never used tidymodels,Q5_6,20,Model stacking ,NA
+R_3P62QyJPa6IXKY1,I have never used tidymodels,Q5_8,20,Post-processing in workflow(),NA
+R_3P62QyJPa6IXKY1,I have never used tidymodels,Q5_9,0,Ignore recipe steps,NA
+R_3P62QyJPa6IXKY1,I have never used tidymodels,Q5_10,0,H2O.ai support ,NA
+R_3P62QyJPa6IXKY1,I have never used tidymodels,Q5_12,0,Other,NA
+R_1g8bxderPUqRyas,I have used tidymodels packages many times,Q5_1,20,Survival analysis,NA
+R_1g8bxderPUqRyas,I have used tidymodels packages many times,Q5_2,0,Support for sparse data structures,NA
+R_1g8bxderPUqRyas,I have used tidymodels packages many times,Q5_3,20,Adaptive resampling and better parallelization,NA
+R_1g8bxderPUqRyas,I have used tidymodels packages many times,Q5_4,10,"Model monitoring, updating, & organization",NA
+R_1g8bxderPUqRyas,I have used tidymodels packages many times,Q5_5,0,Translate prediction equations,NA
+R_1g8bxderPUqRyas,I have used tidymodels packages many times,Q5_6,50,Model stacking ,NA
+R_1g8bxderPUqRyas,I have used tidymodels packages many times,Q5_8,0,Post-processing in workflow(),NA
+R_1g8bxderPUqRyas,I have used tidymodels packages many times,Q5_9,0,Ignore recipe steps,NA
+R_1g8bxderPUqRyas,I have used tidymodels packages many times,Q5_10,0,H2O.ai support ,NA
+R_1g8bxderPUqRyas,I have used tidymodels packages many times,Q5_12,0,Other,NA
+R_3sA2gzfbI4V7o8A,I have used tidymodels packages a few times,Q5_1,50,Survival analysis,NA
+R_3sA2gzfbI4V7o8A,I have used tidymodels packages a few times,Q5_2,0,Support for sparse data structures,NA
+R_3sA2gzfbI4V7o8A,I have used tidymodels packages a few times,Q5_3,25,Adaptive resampling and better parallelization,NA
+R_3sA2gzfbI4V7o8A,I have used tidymodels packages a few times,Q5_4,0,"Model monitoring, updating, & organization",NA
+R_3sA2gzfbI4V7o8A,I have used tidymodels packages a few times,Q5_5,0,Translate prediction equations,NA
+R_3sA2gzfbI4V7o8A,I have used tidymodels packages a few times,Q5_6,25,Model stacking ,NA
+R_3sA2gzfbI4V7o8A,I have used tidymodels packages a few times,Q5_8,0,Post-processing in workflow(),NA
+R_3sA2gzfbI4V7o8A,I have used tidymodels packages a few times,Q5_9,0,Ignore recipe steps,NA
+R_3sA2gzfbI4V7o8A,I have used tidymodels packages a few times,Q5_10,0,H2O.ai support ,NA
+R_3sA2gzfbI4V7o8A,I have used tidymodels packages a few times,Q5_12,0,Other,NA
+R_2dLL0xGInFXF7ga,I have used tidymodels packages a few times,Q5_1,0,Survival analysis,NA
+R_2dLL0xGInFXF7ga,I have used tidymodels packages a few times,Q5_2,0,Support for sparse data structures,NA
+R_2dLL0xGInFXF7ga,I have used tidymodels packages a few times,Q5_3,0,Adaptive resampling and better parallelization,NA
+R_2dLL0xGInFXF7ga,I have used tidymodels packages a few times,Q5_4,100,"Model monitoring, updating, & organization",NA
+R_2dLL0xGInFXF7ga,I have used tidymodels packages a few times,Q5_5,0,Translate prediction equations,NA
+R_2dLL0xGInFXF7ga,I have used tidymodels packages a few times,Q5_6,0,Model stacking ,NA
+R_2dLL0xGInFXF7ga,I have used tidymodels packages a few times,Q5_8,0,Post-processing in workflow(),NA
+R_2dLL0xGInFXF7ga,I have used tidymodels packages a few times,Q5_9,0,Ignore recipe steps,NA
+R_2dLL0xGInFXF7ga,I have used tidymodels packages a few times,Q5_10,0,H2O.ai support ,NA
+R_2dLL0xGInFXF7ga,I have used tidymodels packages a few times,Q5_12,0,Other,NA
+R_3qEZY11UFUevaO5,I have used tidymodels packages a few times,Q5_1,0,Survival analysis,NA
+R_3qEZY11UFUevaO5,I have used tidymodels packages a few times,Q5_2,0,Support for sparse data structures,NA
+R_3qEZY11UFUevaO5,I have used tidymodels packages a few times,Q5_3,20,Adaptive resampling and better parallelization,NA
+R_3qEZY11UFUevaO5,I have used tidymodels packages a few times,Q5_4,20,"Model monitoring, updating, & organization",NA
+R_3qEZY11UFUevaO5,I have used tidymodels packages a few times,Q5_5,20,Translate prediction equations,NA
+R_3qEZY11UFUevaO5,I have used tidymodels packages a few times,Q5_6,20,Model stacking ,NA
+R_3qEZY11UFUevaO5,I have used tidymodels packages a few times,Q5_8,0,Post-processing in workflow(),NA
+R_3qEZY11UFUevaO5,I have used tidymodels packages a few times,Q5_9,10,Ignore recipe steps,NA
+R_3qEZY11UFUevaO5,I have used tidymodels packages a few times,Q5_10,10,H2O.ai support ,NA
+R_3qEZY11UFUevaO5,I have used tidymodels packages a few times,Q5_12,0,Other,NA
+R_1C3zOs3HaJz642h,I have used tidymodels packages many times,Q5_1,2,Survival analysis,NA
+R_1C3zOs3HaJz642h,I have used tidymodels packages many times,Q5_2,2,Support for sparse data structures,NA
+R_1C3zOs3HaJz642h,I have used tidymodels packages many times,Q5_3,2,Adaptive resampling and better parallelization,NA
+R_1C3zOs3HaJz642h,I have used tidymodels packages many times,Q5_4,6,"Model monitoring, updating, & organization",NA
+R_1C3zOs3HaJz642h,I have used tidymodels packages many times,Q5_5,40,Translate prediction equations,NA
+R_1C3zOs3HaJz642h,I have used tidymodels packages many times,Q5_6,2,Model stacking ,NA
+R_1C3zOs3HaJz642h,I have used tidymodels packages many times,Q5_8,40,Post-processing in workflow(),NA
+R_1C3zOs3HaJz642h,I have used tidymodels packages many times,Q5_9,6,Ignore recipe steps,NA
+R_1C3zOs3HaJz642h,I have used tidymodels packages many times,Q5_10,0,H2O.ai support ,NA
+R_1C3zOs3HaJz642h,I have used tidymodels packages many times,Q5_12,0,Other,NA
+R_8CZYFSuhM1q9lPb,I have never used tidymodels,Q5_1,80,Survival analysis,NA
+R_8CZYFSuhM1q9lPb,I have never used tidymodels,Q5_2,0,Support for sparse data structures,NA
+R_8CZYFSuhM1q9lPb,I have never used tidymodels,Q5_3,0,Adaptive resampling and better parallelization,NA
+R_8CZYFSuhM1q9lPb,I have never used tidymodels,Q5_4,0,"Model monitoring, updating, & organization",NA
+R_8CZYFSuhM1q9lPb,I have never used tidymodels,Q5_5,0,Translate prediction equations,NA
+R_8CZYFSuhM1q9lPb,I have never used tidymodels,Q5_6,20,Model stacking ,NA
+R_8CZYFSuhM1q9lPb,I have never used tidymodels,Q5_8,0,Post-processing in workflow(),NA
+R_8CZYFSuhM1q9lPb,I have never used tidymodels,Q5_9,0,Ignore recipe steps,NA
+R_8CZYFSuhM1q9lPb,I have never used tidymodels,Q5_10,0,H2O.ai support ,NA
+R_8CZYFSuhM1q9lPb,I have never used tidymodels,Q5_12,0,Other,NA
+R_3dEuMjMC7mNHnh5,I have never used tidymodels,Q5_1,25,Survival analysis,NA
+R_3dEuMjMC7mNHnh5,I have never used tidymodels,Q5_2,0,Support for sparse data structures,NA
+R_3dEuMjMC7mNHnh5,I have never used tidymodels,Q5_3,0,Adaptive resampling and better parallelization,NA
+R_3dEuMjMC7mNHnh5,I have never used tidymodels,Q5_4,25,"Model monitoring, updating, & organization",NA
+R_3dEuMjMC7mNHnh5,I have never used tidymodels,Q5_5,25,Translate prediction equations,NA
+R_3dEuMjMC7mNHnh5,I have never used tidymodels,Q5_6,0,Model stacking ,NA
+R_3dEuMjMC7mNHnh5,I have never used tidymodels,Q5_8,0,Post-processing in workflow(),NA
+R_3dEuMjMC7mNHnh5,I have never used tidymodels,Q5_9,0,Ignore recipe steps,NA
+R_3dEuMjMC7mNHnh5,I have never used tidymodels,Q5_10,25,H2O.ai support ,NA
+R_3dEuMjMC7mNHnh5,I have never used tidymodels,Q5_12,0,Other,NA
+R_3sEhCqKwnGjqzJv,I have used tidymodels packages many times,Q5_1,0,Survival analysis,NA
+R_3sEhCqKwnGjqzJv,I have used tidymodels packages many times,Q5_2,0,Support for sparse data structures,NA
+R_3sEhCqKwnGjqzJv,I have used tidymodels packages many times,Q5_3,0,Adaptive resampling and better parallelization,NA
+R_3sEhCqKwnGjqzJv,I have used tidymodels packages many times,Q5_4,20,"Model monitoring, updating, & organization",NA
+R_3sEhCqKwnGjqzJv,I have used tidymodels packages many times,Q5_5,20,Translate prediction equations,NA
+R_3sEhCqKwnGjqzJv,I have used tidymodels packages many times,Q5_6,10,Model stacking ,NA
+R_3sEhCqKwnGjqzJv,I have used tidymodels packages many times,Q5_8,30,Post-processing in workflow(),NA
+R_3sEhCqKwnGjqzJv,I have used tidymodels packages many times,Q5_9,20,Ignore recipe steps,NA
+R_3sEhCqKwnGjqzJv,I have used tidymodels packages many times,Q5_10,0,H2O.ai support ,NA
+R_3sEhCqKwnGjqzJv,I have used tidymodels packages many times,Q5_12,0,Other,NA
+R_816KBEarag3yFMd,I have used tidymodels packages many times,Q5_1,50,Survival analysis,NA
+R_816KBEarag3yFMd,I have used tidymodels packages many times,Q5_2,0,Support for sparse data structures,NA
+R_816KBEarag3yFMd,I have used tidymodels packages many times,Q5_3,0,Adaptive resampling and better parallelization,NA
+R_816KBEarag3yFMd,I have used tidymodels packages many times,Q5_4,0,"Model monitoring, updating, & organization",NA
+R_816KBEarag3yFMd,I have used tidymodels packages many times,Q5_5,0,Translate prediction equations,NA
+R_816KBEarag3yFMd,I have used tidymodels packages many times,Q5_6,25,Model stacking ,NA
+R_816KBEarag3yFMd,I have used tidymodels packages many times,Q5_8,0,Post-processing in workflow(),NA
+R_816KBEarag3yFMd,I have used tidymodels packages many times,Q5_9,0,Ignore recipe steps,NA
+R_816KBEarag3yFMd,I have used tidymodels packages many times,Q5_10,25,H2O.ai support ,NA
+R_816KBEarag3yFMd,I have used tidymodels packages many times,Q5_12,0,Other,NA
+R_2aDpTYW9WimXc5S,I have used tidymodels packages a few times,Q5_1,12,Survival analysis,NA
+R_2aDpTYW9WimXc5S,I have used tidymodels packages a few times,Q5_2,10,Support for sparse data structures,NA
+R_2aDpTYW9WimXc5S,I have used tidymodels packages a few times,Q5_3,10,Adaptive resampling and better parallelization,NA
+R_2aDpTYW9WimXc5S,I have used tidymodels packages a few times,Q5_4,12,"Model monitoring, updating, & organization",NA
+R_2aDpTYW9WimXc5S,I have used tidymodels packages a few times,Q5_5,15,Translate prediction equations,NA
+R_2aDpTYW9WimXc5S,I have used tidymodels packages a few times,Q5_6,15,Model stacking ,NA
+R_2aDpTYW9WimXc5S,I have used tidymodels packages a few times,Q5_8,20,Post-processing in workflow(),NA
+R_2aDpTYW9WimXc5S,I have used tidymodels packages a few times,Q5_9,4,Ignore recipe steps,NA
+R_2aDpTYW9WimXc5S,I have used tidymodels packages a few times,Q5_10,2,H2O.ai support ,NA
+R_2aDpTYW9WimXc5S,I have used tidymodels packages a few times,Q5_12,0,Other,NA
+R_xgt2BZWT6UsQtZn,I have never used tidymodels,Q5_1,5,Survival analysis,NA
+R_xgt2BZWT6UsQtZn,I have never used tidymodels,Q5_2,10,Support for sparse data structures,NA
+R_xgt2BZWT6UsQtZn,I have never used tidymodels,Q5_3,25,Adaptive resampling and better parallelization,NA
+R_xgt2BZWT6UsQtZn,I have never used tidymodels,Q5_4,20,"Model monitoring, updating, & organization",NA
+R_xgt2BZWT6UsQtZn,I have never used tidymodels,Q5_5,5,Translate prediction equations,NA
+R_xgt2BZWT6UsQtZn,I have never used tidymodels,Q5_6,10,Model stacking ,NA
+R_xgt2BZWT6UsQtZn,I have never used tidymodels,Q5_8,5,Post-processing in workflow(),NA
+R_xgt2BZWT6UsQtZn,I have never used tidymodels,Q5_9,15,Ignore recipe steps,NA
+R_xgt2BZWT6UsQtZn,I have never used tidymodels,Q5_10,5,H2O.ai support ,NA
+R_xgt2BZWT6UsQtZn,I have never used tidymodels,Q5_12,0,Other,NA
+R_3QYGoC0xvVFpLFW,I have used tidymodels packages many times,Q5_1,0,Survival analysis,NA
+R_3QYGoC0xvVFpLFW,I have used tidymodels packages many times,Q5_2,0,Support for sparse data structures,NA
+R_3QYGoC0xvVFpLFW,I have used tidymodels packages many times,Q5_3,0,Adaptive resampling and better parallelization,NA
+R_3QYGoC0xvVFpLFW,I have used tidymodels packages many times,Q5_4,0,"Model monitoring, updating, & organization",NA
+R_3QYGoC0xvVFpLFW,I have used tidymodels packages many times,Q5_5,50,Translate prediction equations,NA
+R_3QYGoC0xvVFpLFW,I have used tidymodels packages many times,Q5_6,0,Model stacking ,NA
+R_3QYGoC0xvVFpLFW,I have used tidymodels packages many times,Q5_8,0,Post-processing in workflow(),NA
+R_3QYGoC0xvVFpLFW,I have used tidymodels packages many times,Q5_9,0,Ignore recipe steps,NA
+R_3QYGoC0xvVFpLFW,I have used tidymodels packages many times,Q5_10,10,H2O.ai support ,NA
+R_3QYGoC0xvVFpLFW,I have used tidymodels packages many times,Q5_12,40,Other,Translate recipes into SQL so data processing can also be exported to the database
+R_2SGJjl47cuoozwV,I have used tidymodels packages a few times,Q5_1,0,Survival analysis,NA
+R_2SGJjl47cuoozwV,I have used tidymodels packages a few times,Q5_2,0,Support for sparse data structures,NA
+R_2SGJjl47cuoozwV,I have used tidymodels packages a few times,Q5_3,25,Adaptive resampling and better parallelization,NA
+R_2SGJjl47cuoozwV,I have used tidymodels packages a few times,Q5_4,25,"Model monitoring, updating, & organization",NA
+R_2SGJjl47cuoozwV,I have used tidymodels packages a few times,Q5_5,50,Translate prediction equations,NA
+R_2SGJjl47cuoozwV,I have used tidymodels packages a few times,Q5_6,0,Model stacking ,NA
+R_2SGJjl47cuoozwV,I have used tidymodels packages a few times,Q5_8,0,Post-processing in workflow(),NA
+R_2SGJjl47cuoozwV,I have used tidymodels packages a few times,Q5_9,0,Ignore recipe steps,NA
+R_2SGJjl47cuoozwV,I have used tidymodels packages a few times,Q5_10,0,H2O.ai support ,NA
+R_2SGJjl47cuoozwV,I have used tidymodels packages a few times,Q5_12,0,Other,NA
+R_3PXIcptdbAIhVD2,I have used tidymodels packages a few times,Q5_1,0,Survival analysis,NA
+R_3PXIcptdbAIhVD2,I have used tidymodels packages a few times,Q5_2,0,Support for sparse data structures,NA
+R_3PXIcptdbAIhVD2,I have used tidymodels packages a few times,Q5_3,0,Adaptive resampling and better parallelization,NA
+R_3PXIcptdbAIhVD2,I have used tidymodels packages a few times,Q5_4,0,"Model monitoring, updating, & organization",NA
+R_3PXIcptdbAIhVD2,I have used tidymodels packages a few times,Q5_5,0,Translate prediction equations,NA
+R_3PXIcptdbAIhVD2,I have used tidymodels packages a few times,Q5_6,10,Model stacking ,NA
+R_3PXIcptdbAIhVD2,I have used tidymodels packages a few times,Q5_8,0,Post-processing in workflow(),NA
+R_3PXIcptdbAIhVD2,I have used tidymodels packages a few times,Q5_9,0,Ignore recipe steps,NA
+R_3PXIcptdbAIhVD2,I have used tidymodels packages a few times,Q5_10,0,H2O.ai support ,NA
+R_3PXIcptdbAIhVD2,I have used tidymodels packages a few times,Q5_12,90,Other,feature selection like RFE
+R_afU0Dh8vdbnldp7,I have used tidymodels packages a few times,Q5_1,0,Survival analysis,NA
+R_afU0Dh8vdbnldp7,I have used tidymodels packages a few times,Q5_2,0,Support for sparse data structures,NA
+R_afU0Dh8vdbnldp7,I have used tidymodels packages a few times,Q5_3,10,Adaptive resampling and better parallelization,NA
+R_afU0Dh8vdbnldp7,I have used tidymodels packages a few times,Q5_4,30,"Model monitoring, updating, & organization",NA
+R_afU0Dh8vdbnldp7,I have used tidymodels packages a few times,Q5_5,20,Translate prediction equations,NA
+R_afU0Dh8vdbnldp7,I have used tidymodels packages a few times,Q5_6,20,Model stacking ,NA
+R_afU0Dh8vdbnldp7,I have used tidymodels packages a few times,Q5_8,0,Post-processing in workflow(),NA
+R_afU0Dh8vdbnldp7,I have used tidymodels packages a few times,Q5_9,20,Ignore recipe steps,NA
+R_afU0Dh8vdbnldp7,I have used tidymodels packages a few times,Q5_10,0,H2O.ai support ,NA
+R_afU0Dh8vdbnldp7,I have used tidymodels packages a few times,Q5_12,0,Other,NA
+R_1nPnuuzyKAB04HH,I have contributed to tidymodels packages or taught others how to use them,Q5_1,0,Survival analysis,NA
+R_1nPnuuzyKAB04HH,I have contributed to tidymodels packages or taught others how to use them,Q5_2,0,Support for sparse data structures,NA
+R_1nPnuuzyKAB04HH,I have contributed to tidymodels packages or taught others how to use them,Q5_3,50,Adaptive resampling and better parallelization,NA
+R_1nPnuuzyKAB04HH,I have contributed to tidymodels packages or taught others how to use them,Q5_4,0,"Model monitoring, updating, & organization",NA
+R_1nPnuuzyKAB04HH,I have contributed to tidymodels packages or taught others how to use them,Q5_5,0,Translate prediction equations,NA
+R_1nPnuuzyKAB04HH,I have contributed to tidymodels packages or taught others how to use them,Q5_6,25,Model stacking ,NA
+R_1nPnuuzyKAB04HH,I have contributed to tidymodels packages or taught others how to use them,Q5_8,0,Post-processing in workflow(),NA
+R_1nPnuuzyKAB04HH,I have contributed to tidymodels packages or taught others how to use them,Q5_9,0,Ignore recipe steps,NA
+R_1nPnuuzyKAB04HH,I have contributed to tidymodels packages or taught others how to use them,Q5_10,25,H2O.ai support ,NA
+R_1nPnuuzyKAB04HH,I have contributed to tidymodels packages or taught others how to use them,Q5_12,0,Other,NA
+R_264Sk5Gsf8gNJtA,I have used tidymodels packages a few times,Q5_1,20,Survival analysis,NA
+R_264Sk5Gsf8gNJtA,I have used tidymodels packages a few times,Q5_2,0,Support for sparse data structures,NA
+R_264Sk5Gsf8gNJtA,I have used tidymodels packages a few times,Q5_3,20,Adaptive resampling and better parallelization,NA
+R_264Sk5Gsf8gNJtA,I have used tidymodels packages a few times,Q5_4,20,"Model monitoring, updating, & organization",NA
+R_264Sk5Gsf8gNJtA,I have used tidymodels packages a few times,Q5_5,0,Translate prediction equations,NA
+R_264Sk5Gsf8gNJtA,I have used tidymodels packages a few times,Q5_6,20,Model stacking ,NA
+R_264Sk5Gsf8gNJtA,I have used tidymodels packages a few times,Q5_8,20,Post-processing in workflow(),NA
+R_264Sk5Gsf8gNJtA,I have used tidymodels packages a few times,Q5_9,0,Ignore recipe steps,NA
+R_264Sk5Gsf8gNJtA,I have used tidymodels packages a few times,Q5_10,0,H2O.ai support ,NA
+R_264Sk5Gsf8gNJtA,I have used tidymodels packages a few times,Q5_12,0,Other,NA
+R_3HZyHyeqz0mJkHf,I have used tidymodels packages a few times,Q5_1,0,Survival analysis,NA
+R_3HZyHyeqz0mJkHf,I have used tidymodels packages a few times,Q5_2,10,Support for sparse data structures,NA
+R_3HZyHyeqz0mJkHf,I have used tidymodels packages a few times,Q5_3,20,Adaptive resampling and better parallelization,NA
+R_3HZyHyeqz0mJkHf,I have used tidymodels packages a few times,Q5_4,10,"Model monitoring, updating, & organization",NA
+R_3HZyHyeqz0mJkHf,I have used tidymodels packages a few times,Q5_5,10,Translate prediction equations,NA
+R_3HZyHyeqz0mJkHf,I have used tidymodels packages a few times,Q5_6,20,Model stacking ,NA
+R_3HZyHyeqz0mJkHf,I have used tidymodels packages a few times,Q5_8,10,Post-processing in workflow(),NA
+R_3HZyHyeqz0mJkHf,I have used tidymodels packages a few times,Q5_9,0,Ignore recipe steps,NA
+R_3HZyHyeqz0mJkHf,I have used tidymodels packages a few times,Q5_10,20,H2O.ai support ,NA
+R_3HZyHyeqz0mJkHf,I have used tidymodels packages a few times,Q5_12,0,Other,NA
+R_2a8C10ySQIw7NRj,I have used tidymodels packages a few times,Q5_1,0,Survival analysis,NA
+R_2a8C10ySQIw7NRj,I have used tidymodels packages a few times,Q5_2,0,Support for sparse data structures,NA
+R_2a8C10ySQIw7NRj,I have used tidymodels packages a few times,Q5_3,0,Adaptive resampling and better parallelization,NA
+R_2a8C10ySQIw7NRj,I have used tidymodels packages a few times,Q5_4,20,"Model monitoring, updating, & organization",NA
+R_2a8C10ySQIw7NRj,I have used tidymodels packages a few times,Q5_5,0,Translate prediction equations,NA
+R_2a8C10ySQIw7NRj,I have used tidymodels packages a few times,Q5_6,50,Model stacking ,NA
+R_2a8C10ySQIw7NRj,I have used tidymodels packages a few times,Q5_8,0,Post-processing in workflow(),NA
+R_2a8C10ySQIw7NRj,I have used tidymodels packages a few times,Q5_9,0,Ignore recipe steps,NA
+R_2a8C10ySQIw7NRj,I have used tidymodels packages a few times,Q5_10,30,H2O.ai support ,NA
+R_2a8C10ySQIw7NRj,I have used tidymodels packages a few times,Q5_12,0,Other,NA
+R_1NmrnZwoZW9r7Gm,I have used tidymodels packages many times,Q5_1,0,Survival analysis,NA
+R_1NmrnZwoZW9r7Gm,I have used tidymodels packages many times,Q5_2,0,Support for sparse data structures,NA
+R_1NmrnZwoZW9r7Gm,I have used tidymodels packages many times,Q5_3,0,Adaptive resampling and better parallelization,NA
+R_1NmrnZwoZW9r7Gm,I have used tidymodels packages many times,Q5_4,0,"Model monitoring, updating, & organization",NA
+R_1NmrnZwoZW9r7Gm,I have used tidymodels packages many times,Q5_5,30,Translate prediction equations,NA
+R_1NmrnZwoZW9r7Gm,I have used tidymodels packages many times,Q5_6,0,Model stacking ,NA
+R_1NmrnZwoZW9r7Gm,I have used tidymodels packages many times,Q5_8,0,Post-processing in workflow(),NA
+R_1NmrnZwoZW9r7Gm,I have used tidymodels packages many times,Q5_9,0,Ignore recipe steps,NA
+R_1NmrnZwoZW9r7Gm,I have used tidymodels packages many times,Q5_10,30,H2O.ai support ,NA
+R_1NmrnZwoZW9r7Gm,I have used tidymodels packages many times,Q5_12,40,Other,Export recipe steps as sql/r/python code
+R_QgohU7mBGKCg5Gh,I have used tidymodels packages a few times,Q5_1,0,Survival analysis,NA
+R_QgohU7mBGKCg5Gh,I have used tidymodels packages a few times,Q5_2,30,Support for sparse data structures,NA
+R_QgohU7mBGKCg5Gh,I have used tidymodels packages a few times,Q5_3,60,Adaptive resampling and better parallelization,NA
+R_QgohU7mBGKCg5Gh,I have used tidymodels packages a few times,Q5_4,10,"Model monitoring, updating, & organization",NA
+R_QgohU7mBGKCg5Gh,I have used tidymodels packages a few times,Q5_5,0,Translate prediction equations,NA
+R_QgohU7mBGKCg5Gh,I have used tidymodels packages a few times,Q5_6,0,Model stacking ,NA
+R_QgohU7mBGKCg5Gh,I have used tidymodels packages a few times,Q5_8,0,Post-processing in workflow(),NA
+R_QgohU7mBGKCg5Gh,I have used tidymodels packages a few times,Q5_9,0,Ignore recipe steps,NA
+R_QgohU7mBGKCg5Gh,I have used tidymodels packages a few times,Q5_10,0,H2O.ai support ,NA
+R_QgohU7mBGKCg5Gh,I have used tidymodels packages a few times,Q5_12,0,Other,NA
+R_2Y9h70mbTxpuH9h,I have never used tidymodels,Q5_1,25,Survival analysis,NA
+R_2Y9h70mbTxpuH9h,I have never used tidymodels,Q5_2,5,Support for sparse data structures,NA
+R_2Y9h70mbTxpuH9h,I have never used tidymodels,Q5_3,5,Adaptive resampling and better parallelization,NA
+R_2Y9h70mbTxpuH9h,I have never used tidymodels,Q5_4,20,"Model monitoring, updating, & organization",NA
+R_2Y9h70mbTxpuH9h,I have never used tidymodels,Q5_5,5,Translate prediction equations,NA
+R_2Y9h70mbTxpuH9h,I have never used tidymodels,Q5_6,15,Model stacking ,NA
+R_2Y9h70mbTxpuH9h,I have never used tidymodels,Q5_8,15,Post-processing in workflow(),NA
+R_2Y9h70mbTxpuH9h,I have never used tidymodels,Q5_9,10,Ignore recipe steps,NA
+R_2Y9h70mbTxpuH9h,I have never used tidymodels,Q5_10,0,H2O.ai support ,NA
+R_2Y9h70mbTxpuH9h,I have never used tidymodels,Q5_12,0,Other,NA
+R_1rvJFgFmwYKDTyw,I have used tidymodels packages a few times,Q5_1,0,Survival analysis,NA
+R_1rvJFgFmwYKDTyw,I have used tidymodels packages a few times,Q5_2,50,Support for sparse data structures,NA
+R_1rvJFgFmwYKDTyw,I have used tidymodels packages a few times,Q5_3,30,Adaptive resampling and better parallelization,NA
+R_1rvJFgFmwYKDTyw,I have used tidymodels packages a few times,Q5_4,0,"Model monitoring, updating, & organization",NA
+R_1rvJFgFmwYKDTyw,I have used tidymodels packages a few times,Q5_5,0,Translate prediction equations,NA
+R_1rvJFgFmwYKDTyw,I have used tidymodels packages a few times,Q5_6,0,Model stacking ,NA
+R_1rvJFgFmwYKDTyw,I have used tidymodels packages a few times,Q5_8,0,Post-processing in workflow(),NA
+R_1rvJFgFmwYKDTyw,I have used tidymodels packages a few times,Q5_9,0,Ignore recipe steps,NA
+R_1rvJFgFmwYKDTyw,I have used tidymodels packages a few times,Q5_10,20,H2O.ai support ,NA
+R_1rvJFgFmwYKDTyw,I have used tidymodels packages a few times,Q5_12,0,Other,NA
+R_1jcS5Re2UN1EerE,I have used tidymodels packages many times,Q5_1,0,Survival analysis,NA
+R_1jcS5Re2UN1EerE,I have used tidymodels packages many times,Q5_2,0,Support for sparse data structures,NA
+R_1jcS5Re2UN1EerE,I have used tidymodels packages many times,Q5_3,0,Adaptive resampling and better parallelization,NA
+R_1jcS5Re2UN1EerE,I have used tidymodels packages many times,Q5_4,0,"Model monitoring, updating, & organization",NA
+R_1jcS5Re2UN1EerE,I have used tidymodels packages many times,Q5_5,0,Translate prediction equations,NA
+R_1jcS5Re2UN1EerE,I have used tidymodels packages many times,Q5_6,5,Model stacking ,NA
+R_1jcS5Re2UN1EerE,I have used tidymodels packages many times,Q5_8,0,Post-processing in workflow(),NA
+R_1jcS5Re2UN1EerE,I have used tidymodels packages many times,Q5_9,0,Ignore recipe steps,NA
+R_1jcS5Re2UN1EerE,I have used tidymodels packages many times,Q5_10,5,H2O.ai support ,NA
+R_1jcS5Re2UN1EerE,I have used tidymodels packages many times,Q5_12,90,Other,Support for time series and additive models
+R_11coQWbCMVWHpA4,I have used tidymodels packages a few times,Q5_1,10,Survival analysis,NA
+R_11coQWbCMVWHpA4,I have used tidymodels packages a few times,Q5_2,0,Support for sparse data structures,NA
+R_11coQWbCMVWHpA4,I have used tidymodels packages a few times,Q5_3,0,Adaptive resampling and better parallelization,NA
+R_11coQWbCMVWHpA4,I have used tidymodels packages a few times,Q5_4,0,"Model monitoring, updating, & organization",NA
+R_11coQWbCMVWHpA4,I have used tidymodels packages a few times,Q5_5,10,Translate prediction equations,NA
+R_11coQWbCMVWHpA4,I have used tidymodels packages a few times,Q5_6,50,Model stacking ,NA
+R_11coQWbCMVWHpA4,I have used tidymodels packages a few times,Q5_8,30,Post-processing in workflow(),NA
+R_11coQWbCMVWHpA4,I have used tidymodels packages a few times,Q5_9,0,Ignore recipe steps,NA
+R_11coQWbCMVWHpA4,I have used tidymodels packages a few times,Q5_10,0,H2O.ai support ,NA
+R_11coQWbCMVWHpA4,I have used tidymodels packages a few times,Q5_12,0,Other,NA
+R_2z61nwyjyhNf5yc,I have never used tidymodels,Q5_1,0,Survival analysis,NA
+R_2z61nwyjyhNf5yc,I have never used tidymodels,Q5_2,10,Support for sparse data structures,NA
+R_2z61nwyjyhNf5yc,I have never used tidymodels,Q5_3,10,Adaptive resampling and better parallelization,NA
+R_2z61nwyjyhNf5yc,I have never used tidymodels,Q5_4,10,"Model monitoring, updating, & organization",NA
+R_2z61nwyjyhNf5yc,I have never used tidymodels,Q5_5,10,Translate prediction equations,NA
+R_2z61nwyjyhNf5yc,I have never used tidymodels,Q5_6,20,Model stacking ,NA
+R_2z61nwyjyhNf5yc,I have never used tidymodels,Q5_8,10,Post-processing in workflow(),NA
+R_2z61nwyjyhNf5yc,I have never used tidymodels,Q5_9,20,Ignore recipe steps,NA
+R_2z61nwyjyhNf5yc,I have never used tidymodels,Q5_10,10,H2O.ai support ,NA
+R_2z61nwyjyhNf5yc,I have never used tidymodels,Q5_12,0,Other,NA
+R_2X0toNGz2VXq3hb,I have never used tidymodels,Q5_1,5,Survival analysis,NA
+R_2X0toNGz2VXq3hb,I have never used tidymodels,Q5_2,30,Support for sparse data structures,NA
+R_2X0toNGz2VXq3hb,I have never used tidymodels,Q5_3,20,Adaptive resampling and better parallelization,NA
+R_2X0toNGz2VXq3hb,I have never used tidymodels,Q5_4,30,"Model monitoring, updating, & organization",NA
+R_2X0toNGz2VXq3hb,I have never used tidymodels,Q5_5,0,Translate prediction equations,NA
+R_2X0toNGz2VXq3hb,I have never used tidymodels,Q5_6,10,Model stacking ,NA
+R_2X0toNGz2VXq3hb,I have never used tidymodels,Q5_8,0,Post-processing in workflow(),NA
+R_2X0toNGz2VXq3hb,I have never used tidymodels,Q5_9,0,Ignore recipe steps,NA
+R_2X0toNGz2VXq3hb,I have never used tidymodels,Q5_10,0,H2O.ai support ,NA
+R_2X0toNGz2VXq3hb,I have never used tidymodels,Q5_12,5,Other,NA
+R_cRTT5HSdxa41BWp,I have used tidymodels packages a few times,Q5_1,20,Survival analysis,NA
+R_cRTT5HSdxa41BWp,I have used tidymodels packages a few times,Q5_2,0,Support for sparse data structures,NA
+R_cRTT5HSdxa41BWp,I have used tidymodels packages a few times,Q5_3,10,Adaptive resampling and better parallelization,NA
+R_cRTT5HSdxa41BWp,I have used tidymodels packages a few times,Q5_4,20,"Model monitoring, updating, & organization",NA
+R_cRTT5HSdxa41BWp,I have used tidymodels packages a few times,Q5_5,0,Translate prediction equations,NA
+R_cRTT5HSdxa41BWp,I have used tidymodels packages a few times,Q5_6,20,Model stacking ,NA
+R_cRTT5HSdxa41BWp,I have used tidymodels packages a few times,Q5_8,20,Post-processing in workflow(),NA
+R_cRTT5HSdxa41BWp,I have used tidymodels packages a few times,Q5_9,10,Ignore recipe steps,NA
+R_cRTT5HSdxa41BWp,I have used tidymodels packages a few times,Q5_10,0,H2O.ai support ,NA
+R_cRTT5HSdxa41BWp,I have used tidymodels packages a few times,Q5_12,0,Other,NA
+R_3QFcWwZsxMDw0Kx,I have used tidymodels packages a few times,Q5_1,0,Survival analysis,NA
+R_3QFcWwZsxMDw0Kx,I have used tidymodels packages a few times,Q5_2,0,Support for sparse data structures,NA
+R_3QFcWwZsxMDw0Kx,I have used tidymodels packages a few times,Q5_3,50,Adaptive resampling and better parallelization,NA
+R_3QFcWwZsxMDw0Kx,I have used tidymodels packages a few times,Q5_4,0,"Model monitoring, updating, & organization",NA
+R_3QFcWwZsxMDw0Kx,I have used tidymodels packages a few times,Q5_5,0,Translate prediction equations,NA
+R_3QFcWwZsxMDw0Kx,I have used tidymodels packages a few times,Q5_6,50,Model stacking ,NA
+R_3QFcWwZsxMDw0Kx,I have used tidymodels packages a few times,Q5_8,0,Post-processing in workflow(),NA
+R_3QFcWwZsxMDw0Kx,I have used tidymodels packages a few times,Q5_9,0,Ignore recipe steps,NA
+R_3QFcWwZsxMDw0Kx,I have used tidymodels packages a few times,Q5_10,0,H2O.ai support ,NA
+R_3QFcWwZsxMDw0Kx,I have used tidymodels packages a few times,Q5_12,0,Other,NA
+R_1M65KEC3YQxKDPt,I have used tidymodels packages many times,Q5_1,0,Survival analysis,NA
+R_1M65KEC3YQxKDPt,I have used tidymodels packages many times,Q5_2,0,Support for sparse data structures,NA
+R_1M65KEC3YQxKDPt,I have used tidymodels packages many times,Q5_3,20,Adaptive resampling and better parallelization,NA
+R_1M65KEC3YQxKDPt,I have used tidymodels packages many times,Q5_4,20,"Model monitoring, updating, & organization",NA
+R_1M65KEC3YQxKDPt,I have used tidymodels packages many times,Q5_5,5,Translate prediction equations,NA
+R_1M65KEC3YQxKDPt,I have used tidymodels packages many times,Q5_6,0,Model stacking ,NA
+R_1M65KEC3YQxKDPt,I have used tidymodels packages many times,Q5_8,15,Post-processing in workflow(),NA
+R_1M65KEC3YQxKDPt,I have used tidymodels packages many times,Q5_9,30,Ignore recipe steps,NA
+R_1M65KEC3YQxKDPt,I have used tidymodels packages many times,Q5_10,10,H2O.ai support ,NA
+R_1M65KEC3YQxKDPt,I have used tidymodels packages many times,Q5_12,0,Other,NA
+R_1LSWlsCkb7hRztQ,I have used tidymodels packages many times,Q5_1,0,Survival analysis,NA
+R_1LSWlsCkb7hRztQ,I have used tidymodels packages many times,Q5_2,0,Support for sparse data structures,NA
+R_1LSWlsCkb7hRztQ,I have used tidymodels packages many times,Q5_3,33,Adaptive resampling and better parallelization,NA
+R_1LSWlsCkb7hRztQ,I have used tidymodels packages many times,Q5_4,34,"Model monitoring, updating, & organization",NA
+R_1LSWlsCkb7hRztQ,I have used tidymodels packages many times,Q5_5,0,Translate prediction equations,NA
+R_1LSWlsCkb7hRztQ,I have used tidymodels packages many times,Q5_6,0,Model stacking ,NA
+R_1LSWlsCkb7hRztQ,I have used tidymodels packages many times,Q5_8,33,Post-processing in workflow(),NA
+R_1LSWlsCkb7hRztQ,I have used tidymodels packages many times,Q5_9,0,Ignore recipe steps,NA
+R_1LSWlsCkb7hRztQ,I have used tidymodels packages many times,Q5_10,0,H2O.ai support ,NA
+R_1LSWlsCkb7hRztQ,I have used tidymodels packages many times,Q5_12,0,Other,NA
+R_3JK5DYRkKHNRqKa,I have used tidymodels packages a few times,Q5_1,0,Survival analysis,NA
+R_3JK5DYRkKHNRqKa,I have used tidymodels packages a few times,Q5_2,0,Support for sparse data structures,NA
+R_3JK5DYRkKHNRqKa,I have used tidymodels packages a few times,Q5_3,15,Adaptive resampling and better parallelization,NA
+R_3JK5DYRkKHNRqKa,I have used tidymodels packages a few times,Q5_4,15,"Model monitoring, updating, & organization",NA
+R_3JK5DYRkKHNRqKa,I have used tidymodels packages a few times,Q5_5,10,Translate prediction equations,NA
+R_3JK5DYRkKHNRqKa,I have used tidymodels packages a few times,Q5_6,0,Model stacking ,NA
+R_3JK5DYRkKHNRqKa,I have used tidymodels packages a few times,Q5_8,15,Post-processing in workflow(),NA
+R_3JK5DYRkKHNRqKa,I have used tidymodels packages a few times,Q5_9,15,Ignore recipe steps,NA
+R_3JK5DYRkKHNRqKa,I have used tidymodels packages a few times,Q5_10,0,H2O.ai support ,NA
+R_3JK5DYRkKHNRqKa,I have used tidymodels packages a few times,Q5_12,30,Other,"Full integration for Generalized linear mixed models (incl. CV, Bootstrapping etc.)"
+R_cVhFYr8JAYKesLL,I have used tidymodels packages a few times,Q5_1,0,Survival analysis,NA
+R_cVhFYr8JAYKesLL,I have used tidymodels packages a few times,Q5_2,0,Support for sparse data structures,NA
+R_cVhFYr8JAYKesLL,I have used tidymodels packages a few times,Q5_3,50,Adaptive resampling and better parallelization,NA
+R_cVhFYr8JAYKesLL,I have used tidymodels packages a few times,Q5_4,50,"Model monitoring, updating, & organization",NA
+R_cVhFYr8JAYKesLL,I have used tidymodels packages a few times,Q5_5,0,Translate prediction equations,NA
+R_cVhFYr8JAYKesLL,I have used tidymodels packages a few times,Q5_6,0,Model stacking ,NA
+R_cVhFYr8JAYKesLL,I have used tidymodels packages a few times,Q5_8,0,Post-processing in workflow(),NA
+R_cVhFYr8JAYKesLL,I have used tidymodels packages a few times,Q5_9,0,Ignore recipe steps,NA
+R_cVhFYr8JAYKesLL,I have used tidymodels packages a few times,Q5_10,0,H2O.ai support ,NA
+R_cVhFYr8JAYKesLL,I have used tidymodels packages a few times,Q5_12,0,Other,NA
+R_3qwgj6YspyYCWdt,I have used tidymodels packages many times,Q5_1,0,Survival analysis,NA
+R_3qwgj6YspyYCWdt,I have used tidymodels packages many times,Q5_2,0,Support for sparse data structures,NA
+R_3qwgj6YspyYCWdt,I have used tidymodels packages many times,Q5_3,10,Adaptive resampling and better parallelization,NA
+R_3qwgj6YspyYCWdt,I have used tidymodels packages many times,Q5_4,10,"Model monitoring, updating, & organization",NA
+R_3qwgj6YspyYCWdt,I have used tidymodels packages many times,Q5_5,0,Translate prediction equations,NA
+R_3qwgj6YspyYCWdt,I have used tidymodels packages many times,Q5_6,50,Model stacking ,NA
+R_3qwgj6YspyYCWdt,I have used tidymodels packages many times,Q5_8,30,Post-processing in workflow(),NA
+R_3qwgj6YspyYCWdt,I have used tidymodels packages many times,Q5_9,0,Ignore recipe steps,NA
+R_3qwgj6YspyYCWdt,I have used tidymodels packages many times,Q5_10,0,H2O.ai support ,NA
+R_3qwgj6YspyYCWdt,I have used tidymodels packages many times,Q5_12,0,Other,NA
+R_1eWE0G5S2Ct5xAU,I have used tidymodels packages many times,Q5_1,0,Survival analysis,NA
+R_1eWE0G5S2Ct5xAU,I have used tidymodels packages many times,Q5_2,0,Support for sparse data structures,NA
+R_1eWE0G5S2Ct5xAU,I have used tidymodels packages many times,Q5_3,30,Adaptive resampling and better parallelization,NA
+R_1eWE0G5S2Ct5xAU,I have used tidymodels packages many times,Q5_4,30,"Model monitoring, updating, & organization",NA
+R_1eWE0G5S2Ct5xAU,I have used tidymodels packages many times,Q5_5,10,Translate prediction equations,NA
+R_1eWE0G5S2Ct5xAU,I have used tidymodels packages many times,Q5_6,30,Model stacking ,NA
+R_1eWE0G5S2Ct5xAU,I have used tidymodels packages many times,Q5_8,0,Post-processing in workflow(),NA
+R_1eWE0G5S2Ct5xAU,I have used tidymodels packages many times,Q5_9,0,Ignore recipe steps,NA
+R_1eWE0G5S2Ct5xAU,I have used tidymodels packages many times,Q5_10,0,H2O.ai support ,NA
+R_1eWE0G5S2Ct5xAU,I have used tidymodels packages many times,Q5_12,0,Other,NA
+R_26neSgrmRq7R3s6,I have contributed to tidymodels packages or taught others how to use them,Q5_1,0,Survival analysis,NA
+R_26neSgrmRq7R3s6,I have contributed to tidymodels packages or taught others how to use them,Q5_2,0,Support for sparse data structures,NA
+R_26neSgrmRq7R3s6,I have contributed to tidymodels packages or taught others how to use them,Q5_3,30,Adaptive resampling and better parallelization,NA
+R_26neSgrmRq7R3s6,I have contributed to tidymodels packages or taught others how to use them,Q5_4,10,"Model monitoring, updating, & organization",NA
+R_26neSgrmRq7R3s6,I have contributed to tidymodels packages or taught others how to use them,Q5_5,0,Translate prediction equations,NA
+R_26neSgrmRq7R3s6,I have contributed to tidymodels packages or taught others how to use them,Q5_6,20,Model stacking ,NA
+R_26neSgrmRq7R3s6,I have contributed to tidymodels packages or taught others how to use them,Q5_8,30,Post-processing in workflow(),NA
+R_26neSgrmRq7R3s6,I have contributed to tidymodels packages or taught others how to use them,Q5_9,0,Ignore recipe steps,NA
+R_26neSgrmRq7R3s6,I have contributed to tidymodels packages or taught others how to use them,Q5_10,10,H2O.ai support ,NA
+R_26neSgrmRq7R3s6,I have contributed to tidymodels packages or taught others how to use them,Q5_12,0,Other,NA
+R_2afaz42CfCY0ylQ,I have used tidymodels packages a few times,Q5_1,0,Survival analysis,NA
+R_2afaz42CfCY0ylQ,I have used tidymodels packages a few times,Q5_2,0,Support for sparse data structures,NA
+R_2afaz42CfCY0ylQ,I have used tidymodels packages a few times,Q5_3,10,Adaptive resampling and better parallelization,NA
+R_2afaz42CfCY0ylQ,I have used tidymodels packages a few times,Q5_4,0,"Model monitoring, updating, & organization",NA
+R_2afaz42CfCY0ylQ,I have used tidymodels packages a few times,Q5_5,0,Translate prediction equations,NA
+R_2afaz42CfCY0ylQ,I have used tidymodels packages a few times,Q5_6,20,Model stacking ,NA
+R_2afaz42CfCY0ylQ,I have used tidymodels packages a few times,Q5_8,10,Post-processing in workflow(),NA
+R_2afaz42CfCY0ylQ,I have used tidymodels packages a few times,Q5_9,10,Ignore recipe steps,NA
+R_2afaz42CfCY0ylQ,I have used tidymodels packages a few times,Q5_10,0,H2O.ai support ,NA
+R_2afaz42CfCY0ylQ,I have used tidymodels packages a few times,Q5_12,50,Other,Class weights
+R_1ZzBf4SGn9Dtn7X,I have used tidymodels packages many times,Q5_1,25,Survival analysis,NA
+R_1ZzBf4SGn9Dtn7X,I have used tidymodels packages many times,Q5_2,0,Support for sparse data structures,NA
+R_1ZzBf4SGn9Dtn7X,I have used tidymodels packages many times,Q5_3,0,Adaptive resampling and better parallelization,NA
+R_1ZzBf4SGn9Dtn7X,I have used tidymodels packages many times,Q5_4,5,"Model monitoring, updating, & organization",NA
+R_1ZzBf4SGn9Dtn7X,I have used tidymodels packages many times,Q5_5,20,Translate prediction equations,NA
+R_1ZzBf4SGn9Dtn7X,I have used tidymodels packages many times,Q5_6,20,Model stacking ,NA
+R_1ZzBf4SGn9Dtn7X,I have used tidymodels packages many times,Q5_8,5,Post-processing in workflow(),NA
+R_1ZzBf4SGn9Dtn7X,I have used tidymodels packages many times,Q5_9,0,Ignore recipe steps,NA
+R_1ZzBf4SGn9Dtn7X,I have used tidymodels packages many times,Q5_10,0,H2O.ai support ,NA
+R_1ZzBf4SGn9Dtn7X,I have used tidymodels packages many times,Q5_12,25,Other,Additional models - GAM / mixed / panel
+R_2zGEZKMpdCIy2Bu,I have used tidymodels packages many times,Q5_1,0,Survival analysis,NA
+R_2zGEZKMpdCIy2Bu,I have used tidymodels packages many times,Q5_2,0,Support for sparse data structures,NA
+R_2zGEZKMpdCIy2Bu,I have used tidymodels packages many times,Q5_3,0,Adaptive resampling and better parallelization,NA
+R_2zGEZKMpdCIy2Bu,I have used tidymodels packages many times,Q5_4,10,"Model monitoring, updating, & organization",NA
+R_2zGEZKMpdCIy2Bu,I have used tidymodels packages many times,Q5_5,30,Translate prediction equations,NA
+R_2zGEZKMpdCIy2Bu,I have used tidymodels packages many times,Q5_6,0,Model stacking ,NA
+R_2zGEZKMpdCIy2Bu,I have used tidymodels packages many times,Q5_8,20,Post-processing in workflow(),NA
+R_2zGEZKMpdCIy2Bu,I have used tidymodels packages many times,Q5_9,0,Ignore recipe steps,NA
+R_2zGEZKMpdCIy2Bu,I have used tidymodels packages many times,Q5_10,40,H2O.ai support ,NA
+R_2zGEZKMpdCIy2Bu,I have used tidymodels packages many times,Q5_12,0,Other,NA
+R_82ZoPvX6rBX5D4R,I have used tidymodels packages a few times,Q5_1,0,Survival analysis,NA
+R_82ZoPvX6rBX5D4R,I have used tidymodels packages a few times,Q5_2,0,Support for sparse data structures,NA
+R_82ZoPvX6rBX5D4R,I have used tidymodels packages a few times,Q5_3,20,Adaptive resampling and better parallelization,NA
+R_82ZoPvX6rBX5D4R,I have used tidymodels packages a few times,Q5_4,30,"Model monitoring, updating, & organization",NA
+R_82ZoPvX6rBX5D4R,I have used tidymodels packages a few times,Q5_5,0,Translate prediction equations,NA
+R_82ZoPvX6rBX5D4R,I have used tidymodels packages a few times,Q5_6,30,Model stacking ,NA
+R_82ZoPvX6rBX5D4R,I have used tidymodels packages a few times,Q5_8,10,Post-processing in workflow(),NA
+R_82ZoPvX6rBX5D4R,I have used tidymodels packages a few times,Q5_9,0,Ignore recipe steps,NA
+R_82ZoPvX6rBX5D4R,I have used tidymodels packages a few times,Q5_10,10,H2O.ai support ,NA
+R_82ZoPvX6rBX5D4R,I have used tidymodels packages a few times,Q5_12,0,Other,NA
+R_2w04j0hkOsos6tm,I have used tidymodels packages a few times,Q5_1,50,Survival analysis,NA
+R_2w04j0hkOsos6tm,I have used tidymodels packages a few times,Q5_2,0,Support for sparse data structures,NA
+R_2w04j0hkOsos6tm,I have used tidymodels packages a few times,Q5_3,0,Adaptive resampling and better parallelization,NA
+R_2w04j0hkOsos6tm,I have used tidymodels packages a few times,Q5_4,50,"Model monitoring, updating, & organization",NA
+R_2w04j0hkOsos6tm,I have used tidymodels packages a few times,Q5_5,0,Translate prediction equations,NA
+R_2w04j0hkOsos6tm,I have used tidymodels packages a few times,Q5_6,0,Model stacking ,NA
+R_2w04j0hkOsos6tm,I have used tidymodels packages a few times,Q5_8,0,Post-processing in workflow(),NA
+R_2w04j0hkOsos6tm,I have used tidymodels packages a few times,Q5_9,0,Ignore recipe steps,NA
+R_2w04j0hkOsos6tm,I have used tidymodels packages a few times,Q5_10,0,H2O.ai support ,NA
+R_2w04j0hkOsos6tm,I have used tidymodels packages a few times,Q5_12,0,Other,NA
+R_ulJ2rFFfNa2o7a9,I have used tidymodels packages a few times,Q5_1,10,Survival analysis,NA
+R_ulJ2rFFfNa2o7a9,I have used tidymodels packages a few times,Q5_2,0,Support for sparse data structures,NA
+R_ulJ2rFFfNa2o7a9,I have used tidymodels packages a few times,Q5_3,0,Adaptive resampling and better parallelization,NA
+R_ulJ2rFFfNa2o7a9,I have used tidymodels packages a few times,Q5_4,0,"Model monitoring, updating, & organization",NA
+R_ulJ2rFFfNa2o7a9,I have used tidymodels packages a few times,Q5_5,0,Translate prediction equations,NA
+R_ulJ2rFFfNa2o7a9,I have used tidymodels packages a few times,Q5_6,30,Model stacking ,NA
+R_ulJ2rFFfNa2o7a9,I have used tidymodels packages a few times,Q5_8,0,Post-processing in workflow(),NA
+R_ulJ2rFFfNa2o7a9,I have used tidymodels packages a few times,Q5_9,30,Ignore recipe steps,NA
+R_ulJ2rFFfNa2o7a9,I have used tidymodels packages a few times,Q5_10,30,H2O.ai support ,NA
+R_ulJ2rFFfNa2o7a9,I have used tidymodels packages a few times,Q5_12,0,Other,NA
+R_26nZJxiBfhsIX2K,I have used tidymodels packages a few times,Q5_1,0,Survival analysis,NA
+R_26nZJxiBfhsIX2K,I have used tidymodels packages a few times,Q5_2,10,Support for sparse data structures,NA
+R_26nZJxiBfhsIX2K,I have used tidymodels packages a few times,Q5_3,10,Adaptive resampling and better parallelization,NA
+R_26nZJxiBfhsIX2K,I have used tidymodels packages a few times,Q5_4,10,"Model monitoring, updating, & organization",NA
+R_26nZJxiBfhsIX2K,I have used tidymodels packages a few times,Q5_5,50,Translate prediction equations,NA
+R_26nZJxiBfhsIX2K,I have used tidymodels packages a few times,Q5_6,10,Model stacking ,NA
+R_26nZJxiBfhsIX2K,I have used tidymodels packages a few times,Q5_8,0,Post-processing in workflow(),NA
+R_26nZJxiBfhsIX2K,I have used tidymodels packages a few times,Q5_9,0,Ignore recipe steps,NA
+R_26nZJxiBfhsIX2K,I have used tidymodels packages a few times,Q5_10,10,H2O.ai support ,NA
+R_26nZJxiBfhsIX2K,I have used tidymodels packages a few times,Q5_12,0,Other,NA
+R_3O9y3B6t3EwCLf7,I have used tidymodels packages a few times,Q5_1,10,Survival analysis,NA
+R_3O9y3B6t3EwCLf7,I have used tidymodels packages a few times,Q5_2,0,Support for sparse data structures,NA
+R_3O9y3B6t3EwCLf7,I have used tidymodels packages a few times,Q5_3,0,Adaptive resampling and better parallelization,NA
+R_3O9y3B6t3EwCLf7,I have used tidymodels packages a few times,Q5_4,10,"Model monitoring, updating, & organization",NA
+R_3O9y3B6t3EwCLf7,I have used tidymodels packages a few times,Q5_5,40,Translate prediction equations,NA
+R_3O9y3B6t3EwCLf7,I have used tidymodels packages a few times,Q5_6,10,Model stacking ,NA
+R_3O9y3B6t3EwCLf7,I have used tidymodels packages a few times,Q5_8,20,Post-processing in workflow(),NA
+R_3O9y3B6t3EwCLf7,I have used tidymodels packages a few times,Q5_9,0,Ignore recipe steps,NA
+R_3O9y3B6t3EwCLf7,I have used tidymodels packages a few times,Q5_10,10,H2O.ai support ,NA
+R_3O9y3B6t3EwCLf7,I have used tidymodels packages a few times,Q5_12,0,Other,NA
+R_ufXChW0Ujwvsw0x,I have used tidymodels packages a few times,Q5_1,40,Survival analysis,NA
+R_ufXChW0Ujwvsw0x,I have used tidymodels packages a few times,Q5_2,0,Support for sparse data structures,NA
+R_ufXChW0Ujwvsw0x,I have used tidymodels packages a few times,Q5_3,5,Adaptive resampling and better parallelization,NA
+R_ufXChW0Ujwvsw0x,I have used tidymodels packages a few times,Q5_4,20,"Model monitoring, updating, & organization",NA
+R_ufXChW0Ujwvsw0x,I have used tidymodels packages a few times,Q5_5,20,Translate prediction equations,NA
+R_ufXChW0Ujwvsw0x,I have used tidymodels packages a few times,Q5_6,5,Model stacking ,NA
+R_ufXChW0Ujwvsw0x,I have used tidymodels packages a few times,Q5_8,5,Post-processing in workflow(),NA
+R_ufXChW0Ujwvsw0x,I have used tidymodels packages a few times,Q5_9,0,Ignore recipe steps,NA
+R_ufXChW0Ujwvsw0x,I have used tidymodels packages a few times,Q5_10,5,H2O.ai support ,NA
+R_ufXChW0Ujwvsw0x,I have used tidymodels packages a few times,Q5_12,0,Other,NA
+R_2dtoMGy7E6gcqKK,I have used tidymodels packages a few times,Q5_1,0,Survival analysis,NA
+R_2dtoMGy7E6gcqKK,I have used tidymodels packages a few times,Q5_2,0,Support for sparse data structures,NA
+R_2dtoMGy7E6gcqKK,I have used tidymodels packages a few times,Q5_3,0,Adaptive resampling and better parallelization,NA
+R_2dtoMGy7E6gcqKK,I have used tidymodels packages a few times,Q5_4,30,"Model monitoring, updating, & organization",NA
+R_2dtoMGy7E6gcqKK,I have used tidymodels packages a few times,Q5_5,0,Translate prediction equations,NA
+R_2dtoMGy7E6gcqKK,I have used tidymodels packages a few times,Q5_6,30,Model stacking ,NA
+R_2dtoMGy7E6gcqKK,I have used tidymodels packages a few times,Q5_8,0,Post-processing in workflow(),NA
+R_2dtoMGy7E6gcqKK,I have used tidymodels packages a few times,Q5_9,0,Ignore recipe steps,NA
+R_2dtoMGy7E6gcqKK,I have used tidymodels packages a few times,Q5_10,40,H2O.ai support ,NA
+R_2dtoMGy7E6gcqKK,I have used tidymodels packages a few times,Q5_12,0,Other,NA
+R_2R1WbK88kPy8CAp,I have used tidymodels packages a few times,Q5_1,0,Survival analysis,NA
+R_2R1WbK88kPy8CAp,I have used tidymodels packages a few times,Q5_2,0,Support for sparse data structures,NA
+R_2R1WbK88kPy8CAp,I have used tidymodels packages a few times,Q5_3,40,Adaptive resampling and better parallelization,NA
+R_2R1WbK88kPy8CAp,I have used tidymodels packages a few times,Q5_4,0,"Model monitoring, updating, & organization",NA
+R_2R1WbK88kPy8CAp,I have used tidymodels packages a few times,Q5_5,0,Translate prediction equations,NA
+R_2R1WbK88kPy8CAp,I have used tidymodels packages a few times,Q5_6,50,Model stacking ,NA
+R_2R1WbK88kPy8CAp,I have used tidymodels packages a few times,Q5_8,10,Post-processing in workflow(),NA
+R_2R1WbK88kPy8CAp,I have used tidymodels packages a few times,Q5_9,0,Ignore recipe steps,NA
+R_2R1WbK88kPy8CAp,I have used tidymodels packages a few times,Q5_10,0,H2O.ai support ,NA
+R_2R1WbK88kPy8CAp,I have used tidymodels packages a few times,Q5_12,0,Other,NA
+R_7PwfP0p1MfSQAmJ,I have used tidymodels packages many times,Q5_1,0,Survival analysis,NA
+R_7PwfP0p1MfSQAmJ,I have used tidymodels packages many times,Q5_2,0,Support for sparse data structures,NA
+R_7PwfP0p1MfSQAmJ,I have used tidymodels packages many times,Q5_3,15,Adaptive resampling and better parallelization,NA
+R_7PwfP0p1MfSQAmJ,I have used tidymodels packages many times,Q5_4,20,"Model monitoring, updating, & organization",NA
+R_7PwfP0p1MfSQAmJ,I have used tidymodels packages many times,Q5_5,0,Translate prediction equations,NA
+R_7PwfP0p1MfSQAmJ,I have used tidymodels packages many times,Q5_6,20,Model stacking ,NA
+R_7PwfP0p1MfSQAmJ,I have used tidymodels packages many times,Q5_8,20,Post-processing in workflow(),NA
+R_7PwfP0p1MfSQAmJ,I have used tidymodels packages many times,Q5_9,25,Ignore recipe steps,NA
+R_7PwfP0p1MfSQAmJ,I have used tidymodels packages many times,Q5_10,0,H2O.ai support ,NA
+R_7PwfP0p1MfSQAmJ,I have used tidymodels packages many times,Q5_12,0,Other,NA
+R_RITsCFvgA42OKnn,I have used tidymodels packages a few times,Q5_1,0,Survival analysis,NA
+R_RITsCFvgA42OKnn,I have used tidymodels packages a few times,Q5_2,0,Support for sparse data structures,NA
+R_RITsCFvgA42OKnn,I have used tidymodels packages a few times,Q5_3,0,Adaptive resampling and better parallelization,NA
+R_RITsCFvgA42OKnn,I have used tidymodels packages a few times,Q5_4,25,"Model monitoring, updating, & organization",NA
+R_RITsCFvgA42OKnn,I have used tidymodels packages a few times,Q5_5,0,Translate prediction equations,NA
+R_RITsCFvgA42OKnn,I have used tidymodels packages a few times,Q5_6,50,Model stacking ,NA
+R_RITsCFvgA42OKnn,I have used tidymodels packages a few times,Q5_8,0,Post-processing in workflow(),NA
+R_RITsCFvgA42OKnn,I have used tidymodels packages a few times,Q5_9,25,Ignore recipe steps,NA
+R_RITsCFvgA42OKnn,I have used tidymodels packages a few times,Q5_10,0,H2O.ai support ,NA
+R_RITsCFvgA42OKnn,I have used tidymodels packages a few times,Q5_12,0,Other,NA
+R_2dyapXJGQpFrDY3,I have used tidymodels packages a few times,Q5_1,0,Survival analysis,NA
+R_2dyapXJGQpFrDY3,I have used tidymodels packages a few times,Q5_2,0,Support for sparse data structures,NA
+R_2dyapXJGQpFrDY3,I have used tidymodels packages a few times,Q5_3,0,Adaptive resampling and better parallelization,NA
+R_2dyapXJGQpFrDY3,I have used tidymodels packages a few times,Q5_4,30,"Model monitoring, updating, & organization",NA
+R_2dyapXJGQpFrDY3,I have used tidymodels packages a few times,Q5_5,0,Translate prediction equations,NA
+R_2dyapXJGQpFrDY3,I have used tidymodels packages a few times,Q5_6,40,Model stacking ,NA
+R_2dyapXJGQpFrDY3,I have used tidymodels packages a few times,Q5_8,30,Post-processing in workflow(),NA
+R_2dyapXJGQpFrDY3,I have used tidymodels packages a few times,Q5_9,0,Ignore recipe steps,NA
+R_2dyapXJGQpFrDY3,I have used tidymodels packages a few times,Q5_10,0,H2O.ai support ,NA
+R_2dyapXJGQpFrDY3,I have used tidymodels packages a few times,Q5_12,0,Other,NA
+R_3JdXW9R9B2hNCwd,I have used tidymodels packages a few times,Q5_1,33,Survival analysis,NA
+R_3JdXW9R9B2hNCwd,I have used tidymodels packages a few times,Q5_2,0,Support for sparse data structures,NA
+R_3JdXW9R9B2hNCwd,I have used tidymodels packages a few times,Q5_3,33,Adaptive resampling and better parallelization,NA
+R_3JdXW9R9B2hNCwd,I have used tidymodels packages a few times,Q5_4,1,"Model monitoring, updating, & organization",NA
+R_3JdXW9R9B2hNCwd,I have used tidymodels packages a few times,Q5_5,33,Translate prediction equations,NA
+R_3JdXW9R9B2hNCwd,I have used tidymodels packages a few times,Q5_6,0,Model stacking ,NA
+R_3JdXW9R9B2hNCwd,I have used tidymodels packages a few times,Q5_8,0,Post-processing in workflow(),NA
+R_3JdXW9R9B2hNCwd,I have used tidymodels packages a few times,Q5_9,0,Ignore recipe steps,NA
+R_3JdXW9R9B2hNCwd,I have used tidymodels packages a few times,Q5_10,0,H2O.ai support ,NA
+R_3JdXW9R9B2hNCwd,I have used tidymodels packages a few times,Q5_12,0,Other,NA
+R_10pCRhmF6QedMbQ,I have never used tidymodels,Q5_1,0,Survival analysis,NA
+R_10pCRhmF6QedMbQ,I have never used tidymodels,Q5_2,0,Support for sparse data structures,NA
+R_10pCRhmF6QedMbQ,I have never used tidymodels,Q5_3,0,Adaptive resampling and better parallelization,NA
+R_10pCRhmF6QedMbQ,I have never used tidymodels,Q5_4,0,"Model monitoring, updating, & organization",NA
+R_10pCRhmF6QedMbQ,I have never used tidymodels,Q5_5,0,Translate prediction equations,NA
+R_10pCRhmF6QedMbQ,I have never used tidymodels,Q5_6,0,Model stacking ,NA
+R_10pCRhmF6QedMbQ,I have never used tidymodels,Q5_8,0,Post-processing in workflow(),NA
+R_10pCRhmF6QedMbQ,I have never used tidymodels,Q5_9,0,Ignore recipe steps,NA
+R_10pCRhmF6QedMbQ,I have never used tidymodels,Q5_10,0,H2O.ai support ,NA
+R_10pCRhmF6QedMbQ,I have never used tidymodels,Q5_12,100,Other,Survey weights
+R_2YM5bKqBV0arfCq,I have used tidymodels packages a few times,Q5_1,0,Survival analysis,NA
+R_2YM5bKqBV0arfCq,I have used tidymodels packages a few times,Q5_2,0,Support for sparse data structures,NA
+R_2YM5bKqBV0arfCq,I have used tidymodels packages a few times,Q5_3,0,Adaptive resampling and better parallelization,NA
+R_2YM5bKqBV0arfCq,I have used tidymodels packages a few times,Q5_4,0,"Model monitoring, updating, & organization",NA
+R_2YM5bKqBV0arfCq,I have used tidymodels packages a few times,Q5_5,0,Translate prediction equations,NA
+R_2YM5bKqBV0arfCq,I have used tidymodels packages a few times,Q5_6,33,Model stacking ,NA
+R_2YM5bKqBV0arfCq,I have used tidymodels packages a few times,Q5_8,34,Post-processing in workflow(),NA
+R_2YM5bKqBV0arfCq,I have used tidymodels packages a few times,Q5_9,0,Ignore recipe steps,NA
+R_2YM5bKqBV0arfCq,I have used tidymodels packages a few times,Q5_10,33,H2O.ai support ,NA
+R_2YM5bKqBV0arfCq,I have used tidymodels packages a few times,Q5_12,0,Other,NA
+R_2sYhfD2iLdW26rP,I have used tidymodels packages a few times,Q5_1,0,Survival analysis,NA
+R_2sYhfD2iLdW26rP,I have used tidymodels packages a few times,Q5_2,0,Support for sparse data structures,NA
+R_2sYhfD2iLdW26rP,I have used tidymodels packages a few times,Q5_3,30,Adaptive resampling and better parallelization,NA
+R_2sYhfD2iLdW26rP,I have used tidymodels packages a few times,Q5_4,0,"Model monitoring, updating, & organization",NA
+R_2sYhfD2iLdW26rP,I have used tidymodels packages a few times,Q5_5,0,Translate prediction equations,NA
+R_2sYhfD2iLdW26rP,I have used tidymodels packages a few times,Q5_6,0,Model stacking ,NA
+R_2sYhfD2iLdW26rP,I have used tidymodels packages a few times,Q5_8,0,Post-processing in workflow(),NA
+R_2sYhfD2iLdW26rP,I have used tidymodels packages a few times,Q5_9,0,Ignore recipe steps,NA
+R_2sYhfD2iLdW26rP,I have used tidymodels packages a few times,Q5_10,70,H2O.ai support ,NA
+R_2sYhfD2iLdW26rP,I have used tidymodels packages a few times,Q5_12,0,Other,NA
+R_6EGexGsFjuqQuel,I have used tidymodels packages a few times,Q5_1,5,Survival analysis,NA
+R_6EGexGsFjuqQuel,I have used tidymodels packages a few times,Q5_2,5,Support for sparse data structures,NA
+R_6EGexGsFjuqQuel,I have used tidymodels packages a few times,Q5_3,5,Adaptive resampling and better parallelization,NA
+R_6EGexGsFjuqQuel,I have used tidymodels packages a few times,Q5_4,15,"Model monitoring, updating, & organization",NA
+R_6EGexGsFjuqQuel,I have used tidymodels packages a few times,Q5_5,17,Translate prediction equations,NA
+R_6EGexGsFjuqQuel,I have used tidymodels packages a few times,Q5_6,5,Model stacking ,NA
+R_6EGexGsFjuqQuel,I have used tidymodels packages a few times,Q5_8,10,Post-processing in workflow(),NA
+R_6EGexGsFjuqQuel,I have used tidymodels packages a few times,Q5_9,5,Ignore recipe steps,NA
+R_6EGexGsFjuqQuel,I have used tidymodels packages a few times,Q5_10,3,H2O.ai support ,NA
+R_6EGexGsFjuqQuel,I have used tidymodels packages a few times,Q5_12,30,Other,More articles to learn
+R_3NzeElYPB2cBZ4L,I have used tidymodels packages a few times,Q5_1,40,Survival analysis,NA
+R_3NzeElYPB2cBZ4L,I have used tidymodels packages a few times,Q5_2,0,Support for sparse data structures,NA
+R_3NzeElYPB2cBZ4L,I have used tidymodels packages a few times,Q5_3,0,Adaptive resampling and better parallelization,NA
+R_3NzeElYPB2cBZ4L,I have used tidymodels packages a few times,Q5_4,0,"Model monitoring, updating, & organization",NA
+R_3NzeElYPB2cBZ4L,I have used tidymodels packages a few times,Q5_5,0,Translate prediction equations,NA
+R_3NzeElYPB2cBZ4L,I have used tidymodels packages a few times,Q5_6,20,Model stacking ,NA
+R_3NzeElYPB2cBZ4L,I have used tidymodels packages a few times,Q5_8,25,Post-processing in workflow(),NA
+R_3NzeElYPB2cBZ4L,I have used tidymodels packages a few times,Q5_9,0,Ignore recipe steps,NA
+R_3NzeElYPB2cBZ4L,I have used tidymodels packages a few times,Q5_10,15,H2O.ai support ,NA
+R_3NzeElYPB2cBZ4L,I have used tidymodels packages a few times,Q5_12,0,Other,NA
+R_3GjQQ6Y9CSIxLP4,I have used tidymodels packages a few times,Q5_1,0,Survival analysis,NA
+R_3GjQQ6Y9CSIxLP4,I have used tidymodels packages a few times,Q5_2,0,Support for sparse data structures,NA
+R_3GjQQ6Y9CSIxLP4,I have used tidymodels packages a few times,Q5_3,50,Adaptive resampling and better parallelization,NA
+R_3GjQQ6Y9CSIxLP4,I have used tidymodels packages a few times,Q5_4,0,"Model monitoring, updating, & organization",NA
+R_3GjQQ6Y9CSIxLP4,I have used tidymodels packages a few times,Q5_5,0,Translate prediction equations,NA
+R_3GjQQ6Y9CSIxLP4,I have used tidymodels packages a few times,Q5_6,0,Model stacking ,NA
+R_3GjQQ6Y9CSIxLP4,I have used tidymodels packages a few times,Q5_8,0,Post-processing in workflow(),NA
+R_3GjQQ6Y9CSIxLP4,I have used tidymodels packages a few times,Q5_9,0,Ignore recipe steps,NA
+R_3GjQQ6Y9CSIxLP4,I have used tidymodels packages a few times,Q5_10,50,H2O.ai support ,NA
+R_3GjQQ6Y9CSIxLP4,I have used tidymodels packages a few times,Q5_12,0,Other,NA
+R_1K2UtlcoZyuhodj,I have used tidymodels packages a few times,Q5_1,0,Survival analysis,NA
+R_1K2UtlcoZyuhodj,I have used tidymodels packages a few times,Q5_2,15,Support for sparse data structures,NA
+R_1K2UtlcoZyuhodj,I have used tidymodels packages a few times,Q5_3,20,Adaptive resampling and better parallelization,NA
+R_1K2UtlcoZyuhodj,I have used tidymodels packages a few times,Q5_4,10,"Model monitoring, updating, & organization",NA
+R_1K2UtlcoZyuhodj,I have used tidymodels packages a few times,Q5_5,5,Translate prediction equations,NA
+R_1K2UtlcoZyuhodj,I have used tidymodels packages a few times,Q5_6,30,Model stacking ,NA
+R_1K2UtlcoZyuhodj,I have used tidymodels packages a few times,Q5_8,0,Post-processing in workflow(),NA
+R_1K2UtlcoZyuhodj,I have used tidymodels packages a few times,Q5_9,20,Ignore recipe steps,NA
+R_1K2UtlcoZyuhodj,I have used tidymodels packages a few times,Q5_10,0,H2O.ai support ,NA
+R_1K2UtlcoZyuhodj,I have used tidymodels packages a few times,Q5_12,0,Other,NA
+R_3W78f5xBgI49NzX,I have used tidymodels packages many times,Q5_1,25,Survival analysis,NA
+R_3W78f5xBgI49NzX,I have used tidymodels packages many times,Q5_2,25,Support for sparse data structures,NA
+R_3W78f5xBgI49NzX,I have used tidymodels packages many times,Q5_3,0,Adaptive resampling and better parallelization,NA
+R_3W78f5xBgI49NzX,I have used tidymodels packages many times,Q5_4,0,"Model monitoring, updating, & organization",NA
+R_3W78f5xBgI49NzX,I have used tidymodels packages many times,Q5_5,50,Translate prediction equations,NA
+R_3W78f5xBgI49NzX,I have used tidymodels packages many times,Q5_6,0,Model stacking ,NA
+R_3W78f5xBgI49NzX,I have used tidymodels packages many times,Q5_8,0,Post-processing in workflow(),NA
+R_3W78f5xBgI49NzX,I have used tidymodels packages many times,Q5_9,0,Ignore recipe steps,NA
+R_3W78f5xBgI49NzX,I have used tidymodels packages many times,Q5_10,0,H2O.ai support ,NA
+R_3W78f5xBgI49NzX,I have used tidymodels packages many times,Q5_12,0,Other,NA
+R_3DuUrYQxgClrgSH,I have used tidymodels packages a few times,Q5_1,0,Survival analysis,NA
+R_3DuUrYQxgClrgSH,I have used tidymodels packages a few times,Q5_2,0,Support for sparse data structures,NA
+R_3DuUrYQxgClrgSH,I have used tidymodels packages a few times,Q5_3,0,Adaptive resampling and better parallelization,NA
+R_3DuUrYQxgClrgSH,I have used tidymodels packages a few times,Q5_4,0,"Model monitoring, updating, & organization",NA
+R_3DuUrYQxgClrgSH,I have used tidymodels packages a few times,Q5_5,0,Translate prediction equations,NA
+R_3DuUrYQxgClrgSH,I have used tidymodels packages a few times,Q5_6,0,Model stacking ,NA
+R_3DuUrYQxgClrgSH,I have used tidymodels packages a few times,Q5_8,100,Post-processing in workflow(),NA
+R_3DuUrYQxgClrgSH,I have used tidymodels packages a few times,Q5_9,0,Ignore recipe steps,NA
+R_3DuUrYQxgClrgSH,I have used tidymodels packages a few times,Q5_10,0,H2O.ai support ,NA
+R_3DuUrYQxgClrgSH,I have used tidymodels packages a few times,Q5_12,0,Other,NA
+R_3RgaW6sfxnBFHnK,I have used tidymodels packages a few times,Q5_1,5,Survival analysis,NA
+R_3RgaW6sfxnBFHnK,I have used tidymodels packages a few times,Q5_2,15,Support for sparse data structures,NA
+R_3RgaW6sfxnBFHnK,I have used tidymodels packages a few times,Q5_3,10,Adaptive resampling and better parallelization,NA
+R_3RgaW6sfxnBFHnK,I have used tidymodels packages a few times,Q5_4,30,"Model monitoring, updating, & organization",NA
+R_3RgaW6sfxnBFHnK,I have used tidymodels packages a few times,Q5_5,5,Translate prediction equations,NA
+R_3RgaW6sfxnBFHnK,I have used tidymodels packages a few times,Q5_6,10,Model stacking ,NA
+R_3RgaW6sfxnBFHnK,I have used tidymodels packages a few times,Q5_8,15,Post-processing in workflow(),NA
+R_3RgaW6sfxnBFHnK,I have used tidymodels packages a few times,Q5_9,5,Ignore recipe steps,NA
+R_3RgaW6sfxnBFHnK,I have used tidymodels packages a few times,Q5_10,5,H2O.ai support ,NA
+R_3RgaW6sfxnBFHnK,I have used tidymodels packages a few times,Q5_12,0,Other,NA
+R_2tF0q6FOHofUXJD,I have used tidymodels packages many times,Q5_1,5,Survival analysis,NA
+R_2tF0q6FOHofUXJD,I have used tidymodels packages many times,Q5_2,0,Support for sparse data structures,NA
+R_2tF0q6FOHofUXJD,I have used tidymodels packages many times,Q5_3,20,Adaptive resampling and better parallelization,NA
+R_2tF0q6FOHofUXJD,I have used tidymodels packages many times,Q5_4,30,"Model monitoring, updating, & organization",NA
+R_2tF0q6FOHofUXJD,I have used tidymodels packages many times,Q5_5,5,Translate prediction equations,NA
+R_2tF0q6FOHofUXJD,I have used tidymodels packages many times,Q5_6,20,Model stacking ,NA
+R_2tF0q6FOHofUXJD,I have used tidymodels packages many times,Q5_8,10,Post-processing in workflow(),NA
+R_2tF0q6FOHofUXJD,I have used tidymodels packages many times,Q5_9,10,Ignore recipe steps,NA
+R_2tF0q6FOHofUXJD,I have used tidymodels packages many times,Q5_10,0,H2O.ai support ,NA
+R_2tF0q6FOHofUXJD,I have used tidymodels packages many times,Q5_12,0,Other,NA
+R_3sv9CEqzrGxSZNX,I have used tidymodels packages a few times,Q5_1,0,Survival analysis,NA
+R_3sv9CEqzrGxSZNX,I have used tidymodels packages a few times,Q5_2,0,Support for sparse data structures,NA
+R_3sv9CEqzrGxSZNX,I have used tidymodels packages a few times,Q5_3,40,Adaptive resampling and better parallelization,NA
+R_3sv9CEqzrGxSZNX,I have used tidymodels packages a few times,Q5_4,0,"Model monitoring, updating, & organization",NA
+R_3sv9CEqzrGxSZNX,I have used tidymodels packages a few times,Q5_5,50,Translate prediction equations,NA
+R_3sv9CEqzrGxSZNX,I have used tidymodels packages a few times,Q5_6,10,Model stacking ,NA
+R_3sv9CEqzrGxSZNX,I have used tidymodels packages a few times,Q5_8,0,Post-processing in workflow(),NA
+R_3sv9CEqzrGxSZNX,I have used tidymodels packages a few times,Q5_9,0,Ignore recipe steps,NA
+R_3sv9CEqzrGxSZNX,I have used tidymodels packages a few times,Q5_10,0,H2O.ai support ,NA
+R_3sv9CEqzrGxSZNX,I have used tidymodels packages a few times,Q5_12,0,Other,NA
+R_RelGJf10X2cJ9uN,I have used tidymodels packages a few times,Q5_1,0,Survival analysis,NA
+R_RelGJf10X2cJ9uN,I have used tidymodels packages a few times,Q5_2,0,Support for sparse data structures,NA
+R_RelGJf10X2cJ9uN,I have used tidymodels packages a few times,Q5_3,20,Adaptive resampling and better parallelization,NA
+R_RelGJf10X2cJ9uN,I have used tidymodels packages a few times,Q5_4,0,"Model monitoring, updating, & organization",NA
+R_RelGJf10X2cJ9uN,I have used tidymodels packages a few times,Q5_5,30,Translate prediction equations,NA
+R_RelGJf10X2cJ9uN,I have used tidymodels packages a few times,Q5_6,0,Model stacking ,NA
+R_RelGJf10X2cJ9uN,I have used tidymodels packages a few times,Q5_8,30,Post-processing in workflow(),NA
+R_RelGJf10X2cJ9uN,I have used tidymodels packages a few times,Q5_9,0,Ignore recipe steps,NA
+R_RelGJf10X2cJ9uN,I have used tidymodels packages a few times,Q5_10,20,H2O.ai support ,NA
+R_RelGJf10X2cJ9uN,I have used tidymodels packages a few times,Q5_12,0,Other,NA
+R_3gTD2uPvLizR2g1,I have never used tidymodels,Q5_1,0,Survival analysis,NA
+R_3gTD2uPvLizR2g1,I have never used tidymodels,Q5_2,0,Support for sparse data structures,NA
+R_3gTD2uPvLizR2g1,I have never used tidymodels,Q5_3,10,Adaptive resampling and better parallelization,NA
+R_3gTD2uPvLizR2g1,I have never used tidymodels,Q5_4,30,"Model monitoring, updating, & organization",NA
+R_3gTD2uPvLizR2g1,I have never used tidymodels,Q5_5,20,Translate prediction equations,NA
+R_3gTD2uPvLizR2g1,I have never used tidymodels,Q5_6,5,Model stacking ,NA
+R_3gTD2uPvLizR2g1,I have never used tidymodels,Q5_8,5,Post-processing in workflow(),NA
+R_3gTD2uPvLizR2g1,I have never used tidymodels,Q5_9,10,Ignore recipe steps,NA
+R_3gTD2uPvLizR2g1,I have never used tidymodels,Q5_10,20,H2O.ai support ,NA
+R_3gTD2uPvLizR2g1,I have never used tidymodels,Q5_12,0,Other,NA
+R_3RgAQR8v0Ht9IAP,I have used tidymodels packages a few times,Q5_1,0,Survival analysis,NA
+R_3RgAQR8v0Ht9IAP,I have used tidymodels packages a few times,Q5_2,0,Support for sparse data structures,NA
+R_3RgAQR8v0Ht9IAP,I have used tidymodels packages a few times,Q5_3,0,Adaptive resampling and better parallelization,NA
+R_3RgAQR8v0Ht9IAP,I have used tidymodels packages a few times,Q5_4,0,"Model monitoring, updating, & organization",NA
+R_3RgAQR8v0Ht9IAP,I have used tidymodels packages a few times,Q5_5,0,Translate prediction equations,NA
+R_3RgAQR8v0Ht9IAP,I have used tidymodels packages a few times,Q5_6,50,Model stacking ,NA
+R_3RgAQR8v0Ht9IAP,I have used tidymodels packages a few times,Q5_8,0,Post-processing in workflow(),NA
+R_3RgAQR8v0Ht9IAP,I have used tidymodels packages a few times,Q5_9,0,Ignore recipe steps,NA
+R_3RgAQR8v0Ht9IAP,I have used tidymodels packages a few times,Q5_10,50,H2O.ai support ,NA
+R_3RgAQR8v0Ht9IAP,I have used tidymodels packages a few times,Q5_12,0,Other,NA
+R_2VpEa3UczkeVIrS,I have contributed to tidymodels packages or taught others how to use them,Q5_1,50,Survival analysis,NA
+R_2VpEa3UczkeVIrS,I have contributed to tidymodels packages or taught others how to use them,Q5_2,0,Support for sparse data structures,NA
+R_2VpEa3UczkeVIrS,I have contributed to tidymodels packages or taught others how to use them,Q5_3,0,Adaptive resampling and better parallelization,NA
+R_2VpEa3UczkeVIrS,I have contributed to tidymodels packages or taught others how to use them,Q5_4,10,"Model monitoring, updating, & organization",NA
+R_2VpEa3UczkeVIrS,I have contributed to tidymodels packages or taught others how to use them,Q5_5,0,Translate prediction equations,NA
+R_2VpEa3UczkeVIrS,I have contributed to tidymodels packages or taught others how to use them,Q5_6,10,Model stacking ,NA
+R_2VpEa3UczkeVIrS,I have contributed to tidymodels packages or taught others how to use them,Q5_8,0,Post-processing in workflow(),NA
+R_2VpEa3UczkeVIrS,I have contributed to tidymodels packages or taught others how to use them,Q5_9,0,Ignore recipe steps,NA
+R_2VpEa3UczkeVIrS,I have contributed to tidymodels packages or taught others how to use them,Q5_10,30,H2O.ai support ,NA
+R_2VpEa3UczkeVIrS,I have contributed to tidymodels packages or taught others how to use them,Q5_12,0,Other,NA
+R_1LXSl0aXMzImXRQ,I have never used tidymodels,Q5_1,0,Survival analysis,NA
+R_1LXSl0aXMzImXRQ,I have never used tidymodels,Q5_2,0,Support for sparse data structures,NA
+R_1LXSl0aXMzImXRQ,I have never used tidymodels,Q5_3,90,Adaptive resampling and better parallelization,NA
+R_1LXSl0aXMzImXRQ,I have never used tidymodels,Q5_4,10,"Model monitoring, updating, & organization",NA
+R_1LXSl0aXMzImXRQ,I have never used tidymodels,Q5_5,0,Translate prediction equations,NA
+R_1LXSl0aXMzImXRQ,I have never used tidymodels,Q5_6,0,Model stacking ,NA
+R_1LXSl0aXMzImXRQ,I have never used tidymodels,Q5_8,0,Post-processing in workflow(),NA
+R_1LXSl0aXMzImXRQ,I have never used tidymodels,Q5_9,0,Ignore recipe steps,NA
+R_1LXSl0aXMzImXRQ,I have never used tidymodels,Q5_10,0,H2O.ai support ,NA
+R_1LXSl0aXMzImXRQ,I have never used tidymodels,Q5_12,0,Other,NA
+R_3oBiBBNga5ase8c,I have used tidymodels packages a few times,Q5_1,10,Survival analysis,NA
+R_3oBiBBNga5ase8c,I have used tidymodels packages a few times,Q5_2,0,Support for sparse data structures,NA
+R_3oBiBBNga5ase8c,I have used tidymodels packages a few times,Q5_3,10,Adaptive resampling and better parallelization,NA
+R_3oBiBBNga5ase8c,I have used tidymodels packages a few times,Q5_4,0,"Model monitoring, updating, & organization",NA
+R_3oBiBBNga5ase8c,I have used tidymodels packages a few times,Q5_5,10,Translate prediction equations,NA
+R_3oBiBBNga5ase8c,I have used tidymodels packages a few times,Q5_6,30,Model stacking ,NA
+R_3oBiBBNga5ase8c,I have used tidymodels packages a few times,Q5_8,10,Post-processing in workflow(),NA
+R_3oBiBBNga5ase8c,I have used tidymodels packages a few times,Q5_9,0,Ignore recipe steps,NA
+R_3oBiBBNga5ase8c,I have used tidymodels packages a few times,Q5_10,30,H2O.ai support ,NA
+R_3oBiBBNga5ase8c,I have used tidymodels packages a few times,Q5_12,0,Other,NA
+R_2rl76dw5pwEHnQx,I have used tidymodels packages a few times,Q5_1,0,Survival analysis,NA
+R_2rl76dw5pwEHnQx,I have used tidymodels packages a few times,Q5_2,0,Support for sparse data structures,NA
+R_2rl76dw5pwEHnQx,I have used tidymodels packages a few times,Q5_3,0,Adaptive resampling and better parallelization,NA
+R_2rl76dw5pwEHnQx,I have used tidymodels packages a few times,Q5_4,0,"Model monitoring, updating, & organization",NA
+R_2rl76dw5pwEHnQx,I have used tidymodels packages a few times,Q5_5,0,Translate prediction equations,NA
+R_2rl76dw5pwEHnQx,I have used tidymodels packages a few times,Q5_6,0,Model stacking ,NA
+R_2rl76dw5pwEHnQx,I have used tidymodels packages a few times,Q5_8,0,Post-processing in workflow(),NA
+R_2rl76dw5pwEHnQx,I have used tidymodels packages a few times,Q5_9,0,Ignore recipe steps,NA
+R_2rl76dw5pwEHnQx,I have used tidymodels packages a few times,Q5_10,0,H2O.ai support ,NA
+R_2rl76dw5pwEHnQx,I have used tidymodels packages a few times,Q5_12,100,Other,Deep Learning
+R_3L4LLIMIIZbnZEi,I have contributed to tidymodels packages or taught others how to use them,Q5_1,0,Survival analysis,NA
+R_3L4LLIMIIZbnZEi,I have contributed to tidymodels packages or taught others how to use them,Q5_2,0,Support for sparse data structures,NA
+R_3L4LLIMIIZbnZEi,I have contributed to tidymodels packages or taught others how to use them,Q5_3,20,Adaptive resampling and better parallelization,NA
+R_3L4LLIMIIZbnZEi,I have contributed to tidymodels packages or taught others how to use them,Q5_4,20,"Model monitoring, updating, & organization",NA
+R_3L4LLIMIIZbnZEi,I have contributed to tidymodels packages or taught others how to use them,Q5_5,5,Translate prediction equations,NA
+R_3L4LLIMIIZbnZEi,I have contributed to tidymodels packages or taught others how to use them,Q5_6,10,Model stacking ,NA
+R_3L4LLIMIIZbnZEi,I have contributed to tidymodels packages or taught others how to use them,Q5_8,20,Post-processing in workflow(),NA
+R_3L4LLIMIIZbnZEi,I have contributed to tidymodels packages or taught others how to use them,Q5_9,15,Ignore recipe steps,NA
+R_3L4LLIMIIZbnZEi,I have contributed to tidymodels packages or taught others how to use them,Q5_10,10,H2O.ai support ,NA
+R_3L4LLIMIIZbnZEi,I have contributed to tidymodels packages or taught others how to use them,Q5_12,0,Other,NA
+R_3F5pEvaKhpiW7oB,I have used tidymodels packages a few times,Q5_1,0,Survival analysis,NA
+R_3F5pEvaKhpiW7oB,I have used tidymodels packages a few times,Q5_2,0,Support for sparse data structures,NA
+R_3F5pEvaKhpiW7oB,I have used tidymodels packages a few times,Q5_3,10,Adaptive resampling and better parallelization,NA
+R_3F5pEvaKhpiW7oB,I have used tidymodels packages a few times,Q5_4,40,"Model monitoring, updating, & organization",NA
+R_3F5pEvaKhpiW7oB,I have used tidymodels packages a few times,Q5_5,0,Translate prediction equations,NA
+R_3F5pEvaKhpiW7oB,I have used tidymodels packages a few times,Q5_6,0,Model stacking ,NA
+R_3F5pEvaKhpiW7oB,I have used tidymodels packages a few times,Q5_8,30,Post-processing in workflow(),NA
+R_3F5pEvaKhpiW7oB,I have used tidymodels packages a few times,Q5_9,20,Ignore recipe steps,NA
+R_3F5pEvaKhpiW7oB,I have used tidymodels packages a few times,Q5_10,0,H2O.ai support ,NA
+R_3F5pEvaKhpiW7oB,I have used tidymodels packages a few times,Q5_12,0,Other,NA
+R_1mDYpRCXMzzO7Jm,I have used tidymodels packages a few times,Q5_1,10,Survival analysis,NA
+R_1mDYpRCXMzzO7Jm,I have used tidymodels packages a few times,Q5_2,0,Support for sparse data structures,NA
+R_1mDYpRCXMzzO7Jm,I have used tidymodels packages a few times,Q5_3,40,Adaptive resampling and better parallelization,NA
+R_1mDYpRCXMzzO7Jm,I have used tidymodels packages a few times,Q5_4,10,"Model monitoring, updating, & organization",NA
+R_1mDYpRCXMzzO7Jm,I have used tidymodels packages a few times,Q5_5,0,Translate prediction equations,NA
+R_1mDYpRCXMzzO7Jm,I have used tidymodels packages a few times,Q5_6,20,Model stacking ,NA
+R_1mDYpRCXMzzO7Jm,I have used tidymodels packages a few times,Q5_8,0,Post-processing in workflow(),NA
+R_1mDYpRCXMzzO7Jm,I have used tidymodels packages a few times,Q5_9,0,Ignore recipe steps,NA
+R_1mDYpRCXMzzO7Jm,I have used tidymodels packages a few times,Q5_10,20,H2O.ai support ,NA
+R_1mDYpRCXMzzO7Jm,I have used tidymodels packages a few times,Q5_12,0,Other,NA
+R_yIOD3joJQnhyRkB,I have used tidymodels packages a few times,Q5_1,0,Survival analysis,NA
+R_yIOD3joJQnhyRkB,I have used tidymodels packages a few times,Q5_2,35,Support for sparse data structures,NA
+R_yIOD3joJQnhyRkB,I have used tidymodels packages a few times,Q5_3,25,Adaptive resampling and better parallelization,NA
+R_yIOD3joJQnhyRkB,I have used tidymodels packages a few times,Q5_4,20,"Model monitoring, updating, & organization",NA
+R_yIOD3joJQnhyRkB,I have used tidymodels packages a few times,Q5_5,0,Translate prediction equations,NA
+R_yIOD3joJQnhyRkB,I have used tidymodels packages a few times,Q5_6,0,Model stacking ,NA
+R_yIOD3joJQnhyRkB,I have used tidymodels packages a few times,Q5_8,20,Post-processing in workflow(),NA
+R_yIOD3joJQnhyRkB,I have used tidymodels packages a few times,Q5_9,0,Ignore recipe steps,NA
+R_yIOD3joJQnhyRkB,I have used tidymodels packages a few times,Q5_10,0,H2O.ai support ,NA
+R_yIOD3joJQnhyRkB,I have used tidymodels packages a few times,Q5_12,0,Other,NA
+R_3psum1bApaG1F5Q,I have used tidymodels packages a few times,Q5_1,25,Survival analysis,NA
+R_3psum1bApaG1F5Q,I have used tidymodels packages a few times,Q5_2,0,Support for sparse data structures,NA
+R_3psum1bApaG1F5Q,I have used tidymodels packages a few times,Q5_3,0,Adaptive resampling and better parallelization,NA
+R_3psum1bApaG1F5Q,I have used tidymodels packages a few times,Q5_4,20,"Model monitoring, updating, & organization",NA
+R_3psum1bApaG1F5Q,I have used tidymodels packages a few times,Q5_5,0,Translate prediction equations,NA
+R_3psum1bApaG1F5Q,I have used tidymodels packages a few times,Q5_6,25,Model stacking ,NA
+R_3psum1bApaG1F5Q,I have used tidymodels packages a few times,Q5_8,20,Post-processing in workflow(),NA
+R_3psum1bApaG1F5Q,I have used tidymodels packages a few times,Q5_9,0,Ignore recipe steps,NA
+R_3psum1bApaG1F5Q,I have used tidymodels packages a few times,Q5_10,10,H2O.ai support ,NA
+R_3psum1bApaG1F5Q,I have used tidymodels packages a few times,Q5_12,0,Other,NA
+R_2YM4do78C3FghGM,I have used tidymodels packages a few times,Q5_1,30,Survival analysis,NA
+R_2YM4do78C3FghGM,I have used tidymodels packages a few times,Q5_2,0,Support for sparse data structures,NA
+R_2YM4do78C3FghGM,I have used tidymodels packages a few times,Q5_3,20,Adaptive resampling and better parallelization,NA
+R_2YM4do78C3FghGM,I have used tidymodels packages a few times,Q5_4,10,"Model monitoring, updating, & organization",NA
+R_2YM4do78C3FghGM,I have used tidymodels packages a few times,Q5_5,0,Translate prediction equations,NA
+R_2YM4do78C3FghGM,I have used tidymodels packages a few times,Q5_6,10,Model stacking ,NA
+R_2YM4do78C3FghGM,I have used tidymodels packages a few times,Q5_8,20,Post-processing in workflow(),NA
+R_2YM4do78C3FghGM,I have used tidymodels packages a few times,Q5_9,10,Ignore recipe steps,NA
+R_2YM4do78C3FghGM,I have used tidymodels packages a few times,Q5_10,0,H2O.ai support ,NA
+R_2YM4do78C3FghGM,I have used tidymodels packages a few times,Q5_12,0,Other,NA
+R_26koU0Px0uoflm1,I have used tidymodels packages a few times,Q5_1,30,Survival analysis,NA
+R_26koU0Px0uoflm1,I have used tidymodels packages a few times,Q5_2,30,Support for sparse data structures,NA
+R_26koU0Px0uoflm1,I have used tidymodels packages a few times,Q5_3,20,Adaptive resampling and better parallelization,NA
+R_26koU0Px0uoflm1,I have used tidymodels packages a few times,Q5_4,0,"Model monitoring, updating, & organization",NA
+R_26koU0Px0uoflm1,I have used tidymodels packages a few times,Q5_5,0,Translate prediction equations,NA
+R_26koU0Px0uoflm1,I have used tidymodels packages a few times,Q5_6,20,Model stacking ,NA
+R_26koU0Px0uoflm1,I have used tidymodels packages a few times,Q5_8,0,Post-processing in workflow(),NA
+R_26koU0Px0uoflm1,I have used tidymodels packages a few times,Q5_9,0,Ignore recipe steps,NA
+R_26koU0Px0uoflm1,I have used tidymodels packages a few times,Q5_10,0,H2O.ai support ,NA
+R_26koU0Px0uoflm1,I have used tidymodels packages a few times,Q5_12,0,Other,NA
+R_2cBoA0kmI9q52Zh,I have used tidymodels packages a few times,Q5_1,5,Survival analysis,NA
+R_2cBoA0kmI9q52Zh,I have used tidymodels packages a few times,Q5_2,20,Support for sparse data structures,NA
+R_2cBoA0kmI9q52Zh,I have used tidymodels packages a few times,Q5_3,5,Adaptive resampling and better parallelization,NA
+R_2cBoA0kmI9q52Zh,I have used tidymodels packages a few times,Q5_4,0,"Model monitoring, updating, & organization",NA
+R_2cBoA0kmI9q52Zh,I have used tidymodels packages a few times,Q5_5,0,Translate prediction equations,NA
+R_2cBoA0kmI9q52Zh,I have used tidymodels packages a few times,Q5_6,20,Model stacking ,NA
+R_2cBoA0kmI9q52Zh,I have used tidymodels packages a few times,Q5_8,0,Post-processing in workflow(),NA
+R_2cBoA0kmI9q52Zh,I have used tidymodels packages a few times,Q5_9,0,Ignore recipe steps,NA
+R_2cBoA0kmI9q52Zh,I have used tidymodels packages a few times,Q5_10,0,H2O.ai support ,NA
+R_2cBoA0kmI9q52Zh,I have used tidymodels packages a few times,Q5_12,50,Other,xgboost
+R_2WJbqXoDoBsZLZT,I have used tidymodels packages many times,Q5_1,0,Survival analysis,NA
+R_2WJbqXoDoBsZLZT,I have used tidymodels packages many times,Q5_2,0,Support for sparse data structures,NA
+R_2WJbqXoDoBsZLZT,I have used tidymodels packages many times,Q5_3,15,Adaptive resampling and better parallelization,NA
+R_2WJbqXoDoBsZLZT,I have used tidymodels packages many times,Q5_4,0,"Model monitoring, updating, & organization",NA
+R_2WJbqXoDoBsZLZT,I have used tidymodels packages many times,Q5_5,10,Translate prediction equations,NA
+R_2WJbqXoDoBsZLZT,I have used tidymodels packages many times,Q5_6,40,Model stacking ,NA
+R_2WJbqXoDoBsZLZT,I have used tidymodels packages many times,Q5_8,15,Post-processing in workflow(),NA
+R_2WJbqXoDoBsZLZT,I have used tidymodels packages many times,Q5_9,0,Ignore recipe steps,NA
+R_2WJbqXoDoBsZLZT,I have used tidymodels packages many times,Q5_10,20,H2O.ai support ,NA
+R_2WJbqXoDoBsZLZT,I have used tidymodels packages many times,Q5_12,0,Other,NA
+R_2qe0HW0tR2UWmnO,I have used tidymodels packages a few times,Q5_1,0,Survival analysis,NA
+R_2qe0HW0tR2UWmnO,I have used tidymodels packages a few times,Q5_2,0,Support for sparse data structures,NA
+R_2qe0HW0tR2UWmnO,I have used tidymodels packages a few times,Q5_3,0,Adaptive resampling and better parallelization,NA
+R_2qe0HW0tR2UWmnO,I have used tidymodels packages a few times,Q5_4,50,"Model monitoring, updating, & organization",NA
+R_2qe0HW0tR2UWmnO,I have used tidymodels packages a few times,Q5_5,0,Translate prediction equations,NA
+R_2qe0HW0tR2UWmnO,I have used tidymodels packages a few times,Q5_6,0,Model stacking ,NA
+R_2qe0HW0tR2UWmnO,I have used tidymodels packages a few times,Q5_8,20,Post-processing in workflow(),NA
+R_2qe0HW0tR2UWmnO,I have used tidymodels packages a few times,Q5_9,0,Ignore recipe steps,NA
+R_2qe0HW0tR2UWmnO,I have used tidymodels packages a few times,Q5_10,30,H2O.ai support ,NA
+R_2qe0HW0tR2UWmnO,I have used tidymodels packages a few times,Q5_12,0,Other,NA
+R_2EudL6JivD70xb7,I have used tidymodels packages a few times,Q5_1,0,Survival analysis,NA
+R_2EudL6JivD70xb7,I have used tidymodels packages a few times,Q5_2,0,Support for sparse data structures,NA
+R_2EudL6JivD70xb7,I have used tidymodels packages a few times,Q5_3,0,Adaptive resampling and better parallelization,NA
+R_2EudL6JivD70xb7,I have used tidymodels packages a few times,Q5_4,30,"Model monitoring, updating, & organization",NA
+R_2EudL6JivD70xb7,I have used tidymodels packages a few times,Q5_5,10,Translate prediction equations,NA
+R_2EudL6JivD70xb7,I have used tidymodels packages a few times,Q5_6,30,Model stacking ,NA
+R_2EudL6JivD70xb7,I have used tidymodels packages a few times,Q5_8,30,Post-processing in workflow(),NA
+R_2EudL6JivD70xb7,I have used tidymodels packages a few times,Q5_9,0,Ignore recipe steps,NA
+R_2EudL6JivD70xb7,I have used tidymodels packages a few times,Q5_10,0,H2O.ai support ,NA
+R_2EudL6JivD70xb7,I have used tidymodels packages a few times,Q5_12,0,Other,NA
+R_U9lU8X41LWfCxd7,I have used tidymodels packages a few times,Q5_1,0,Survival analysis,NA
+R_U9lU8X41LWfCxd7,I have used tidymodels packages a few times,Q5_2,0,Support for sparse data structures,NA
+R_U9lU8X41LWfCxd7,I have used tidymodels packages a few times,Q5_3,0,Adaptive resampling and better parallelization,NA
+R_U9lU8X41LWfCxd7,I have used tidymodels packages a few times,Q5_4,60,"Model monitoring, updating, & organization",NA
+R_U9lU8X41LWfCxd7,I have used tidymodels packages a few times,Q5_5,0,Translate prediction equations,NA
+R_U9lU8X41LWfCxd7,I have used tidymodels packages a few times,Q5_6,0,Model stacking ,NA
+R_U9lU8X41LWfCxd7,I have used tidymodels packages a few times,Q5_8,0,Post-processing in workflow(),NA
+R_U9lU8X41LWfCxd7,I have used tidymodels packages a few times,Q5_9,0,Ignore recipe steps,NA
+R_U9lU8X41LWfCxd7,I have used tidymodels packages a few times,Q5_10,0,H2O.ai support ,NA
+R_U9lU8X41LWfCxd7,I have used tidymodels packages a few times,Q5_12,40,Other,Ease of comparing multiple models at once
+R_3k0a1vtO5Xlhmih,I have used tidymodels packages many times,Q5_1,0,Survival analysis,NA
+R_3k0a1vtO5Xlhmih,I have used tidymodels packages many times,Q5_2,0,Support for sparse data structures,NA
+R_3k0a1vtO5Xlhmih,I have used tidymodels packages many times,Q5_3,0,Adaptive resampling and better parallelization,NA
+R_3k0a1vtO5Xlhmih,I have used tidymodels packages many times,Q5_4,0,"Model monitoring, updating, & organization",NA
+R_3k0a1vtO5Xlhmih,I have used tidymodels packages many times,Q5_5,0,Translate prediction equations,NA
+R_3k0a1vtO5Xlhmih,I have used tidymodels packages many times,Q5_6,0,Model stacking ,NA
+R_3k0a1vtO5Xlhmih,I have used tidymodels packages many times,Q5_8,95,Post-processing in workflow(),NA
+R_3k0a1vtO5Xlhmih,I have used tidymodels packages many times,Q5_9,0,Ignore recipe steps,NA
+R_3k0a1vtO5Xlhmih,I have used tidymodels packages many times,Q5_10,5,H2O.ai support ,NA
+R_3k0a1vtO5Xlhmih,I have used tidymodels packages many times,Q5_12,0,Other,NA
+R_2uQlAHbnhHV1b3m,I have never used tidymodels,Q5_1,0,Survival analysis,NA
+R_2uQlAHbnhHV1b3m,I have never used tidymodels,Q5_2,0,Support for sparse data structures,NA
+R_2uQlAHbnhHV1b3m,I have never used tidymodels,Q5_3,0,Adaptive resampling and better parallelization,NA
+R_2uQlAHbnhHV1b3m,I have never used tidymodels,Q5_4,100,"Model monitoring, updating, & organization",NA
+R_2uQlAHbnhHV1b3m,I have never used tidymodels,Q5_5,0,Translate prediction equations,NA
+R_2uQlAHbnhHV1b3m,I have never used tidymodels,Q5_6,0,Model stacking ,NA
+R_2uQlAHbnhHV1b3m,I have never used tidymodels,Q5_8,0,Post-processing in workflow(),NA
+R_2uQlAHbnhHV1b3m,I have never used tidymodels,Q5_9,0,Ignore recipe steps,NA
+R_2uQlAHbnhHV1b3m,I have never used tidymodels,Q5_10,0,H2O.ai support ,NA
+R_2uQlAHbnhHV1b3m,I have never used tidymodels,Q5_12,0,Other,NA
+R_50wE6lAzQjQ2a41,I have never used tidymodels,Q5_1,0,Survival analysis,NA
+R_50wE6lAzQjQ2a41,I have never used tidymodels,Q5_2,0,Support for sparse data structures,NA
+R_50wE6lAzQjQ2a41,I have never used tidymodels,Q5_3,100,Adaptive resampling and better parallelization,NA
+R_50wE6lAzQjQ2a41,I have never used tidymodels,Q5_4,0,"Model monitoring, updating, & organization",NA
+R_50wE6lAzQjQ2a41,I have never used tidymodels,Q5_5,0,Translate prediction equations,NA
+R_50wE6lAzQjQ2a41,I have never used tidymodels,Q5_6,0,Model stacking ,NA
+R_50wE6lAzQjQ2a41,I have never used tidymodels,Q5_8,0,Post-processing in workflow(),NA
+R_50wE6lAzQjQ2a41,I have never used tidymodels,Q5_9,0,Ignore recipe steps,NA
+R_50wE6lAzQjQ2a41,I have never used tidymodels,Q5_10,0,H2O.ai support ,NA
+R_50wE6lAzQjQ2a41,I have never used tidymodels,Q5_12,0,Other,NA
+R_2sR5j9dZR2QdOLN,I have used tidymodels packages a few times,Q5_1,0,Survival analysis,NA
+R_2sR5j9dZR2QdOLN,I have used tidymodels packages a few times,Q5_2,15,Support for sparse data structures,NA
+R_2sR5j9dZR2QdOLN,I have used tidymodels packages a few times,Q5_3,15,Adaptive resampling and better parallelization,NA
+R_2sR5j9dZR2QdOLN,I have used tidymodels packages a few times,Q5_4,15,"Model monitoring, updating, & organization",NA
+R_2sR5j9dZR2QdOLN,I have used tidymodels packages a few times,Q5_5,30,Translate prediction equations,NA
+R_2sR5j9dZR2QdOLN,I have used tidymodels packages a few times,Q5_6,25,Model stacking ,NA
+R_2sR5j9dZR2QdOLN,I have used tidymodels packages a few times,Q5_8,0,Post-processing in workflow(),NA
+R_2sR5j9dZR2QdOLN,I have used tidymodels packages a few times,Q5_9,0,Ignore recipe steps,NA
+R_2sR5j9dZR2QdOLN,I have used tidymodels packages a few times,Q5_10,0,H2O.ai support ,NA
+R_2sR5j9dZR2QdOLN,I have used tidymodels packages a few times,Q5_12,0,Other,NA
+R_3RrYNyxLmsjM0e6,I have used tidymodels packages a few times,Q5_1,0,Survival analysis,NA
+R_3RrYNyxLmsjM0e6,I have used tidymodels packages a few times,Q5_2,0,Support for sparse data structures,NA
+R_3RrYNyxLmsjM0e6,I have used tidymodels packages a few times,Q5_3,0,Adaptive resampling and better parallelization,NA
+R_3RrYNyxLmsjM0e6,I have used tidymodels packages a few times,Q5_4,0,"Model monitoring, updating, & organization",NA
+R_3RrYNyxLmsjM0e6,I have used tidymodels packages a few times,Q5_5,0,Translate prediction equations,NA
+R_3RrYNyxLmsjM0e6,I have used tidymodels packages a few times,Q5_6,0,Model stacking ,NA
+R_3RrYNyxLmsjM0e6,I have used tidymodels packages a few times,Q5_8,0,Post-processing in workflow(),NA
+R_3RrYNyxLmsjM0e6,I have used tidymodels packages a few times,Q5_9,0,Ignore recipe steps,NA
+R_3RrYNyxLmsjM0e6,I have used tidymodels packages a few times,Q5_10,100,H2O.ai support ,NA
+R_3RrYNyxLmsjM0e6,I have used tidymodels packages a few times,Q5_12,0,Other,NA
+R_2fp1zQN34m1fB3l,I have used tidymodels packages a few times,Q5_1,0,Survival analysis,NA
+R_2fp1zQN34m1fB3l,I have used tidymodels packages a few times,Q5_2,25,Support for sparse data structures,NA
+R_2fp1zQN34m1fB3l,I have used tidymodels packages a few times,Q5_3,0,Adaptive resampling and better parallelization,NA
+R_2fp1zQN34m1fB3l,I have used tidymodels packages a few times,Q5_4,25,"Model monitoring, updating, & organization",NA
+R_2fp1zQN34m1fB3l,I have used tidymodels packages a few times,Q5_5,0,Translate prediction equations,NA
+R_2fp1zQN34m1fB3l,I have used tidymodels packages a few times,Q5_6,0,Model stacking ,NA
+R_2fp1zQN34m1fB3l,I have used tidymodels packages a few times,Q5_8,0,Post-processing in workflow(),NA
+R_2fp1zQN34m1fB3l,I have used tidymodels packages a few times,Q5_9,50,Ignore recipe steps,NA
+R_2fp1zQN34m1fB3l,I have used tidymodels packages a few times,Q5_10,0,H2O.ai support ,NA
+R_2fp1zQN34m1fB3l,I have used tidymodels packages a few times,Q5_12,0,Other,NA
+R_3ktwYQS9ndeGvM0,I have used tidymodels packages a few times,Q5_1,10,Survival analysis,NA
+R_3ktwYQS9ndeGvM0,I have used tidymodels packages a few times,Q5_2,15,Support for sparse data structures,NA
+R_3ktwYQS9ndeGvM0,I have used tidymodels packages a few times,Q5_3,15,Adaptive resampling and better parallelization,NA
+R_3ktwYQS9ndeGvM0,I have used tidymodels packages a few times,Q5_4,10,"Model monitoring, updating, & organization",NA
+R_3ktwYQS9ndeGvM0,I have used tidymodels packages a few times,Q5_5,10,Translate prediction equations,NA
+R_3ktwYQS9ndeGvM0,I have used tidymodels packages a few times,Q5_6,15,Model stacking ,NA
+R_3ktwYQS9ndeGvM0,I have used tidymodels packages a few times,Q5_8,10,Post-processing in workflow(),NA
+R_3ktwYQS9ndeGvM0,I have used tidymodels packages a few times,Q5_9,5,Ignore recipe steps,NA
+R_3ktwYQS9ndeGvM0,I have used tidymodels packages a few times,Q5_10,10,H2O.ai support ,NA
+R_3ktwYQS9ndeGvM0,I have used tidymodels packages a few times,Q5_12,0,Other,NA
+R_2uJyHgYQucldYLm,I have used tidymodels packages a few times,Q5_1,0,Survival analysis,NA
+R_2uJyHgYQucldYLm,I have used tidymodels packages a few times,Q5_2,0,Support for sparse data structures,NA
+R_2uJyHgYQucldYLm,I have used tidymodels packages a few times,Q5_3,0,Adaptive resampling and better parallelization,NA
+R_2uJyHgYQucldYLm,I have used tidymodels packages a few times,Q5_4,0,"Model monitoring, updating, & organization",NA
+R_2uJyHgYQucldYLm,I have used tidymodels packages a few times,Q5_5,0,Translate prediction equations,NA
+R_2uJyHgYQucldYLm,I have used tidymodels packages a few times,Q5_6,0,Model stacking ,NA
+R_2uJyHgYQucldYLm,I have used tidymodels packages a few times,Q5_8,0,Post-processing in workflow(),NA
+R_2uJyHgYQucldYLm,I have used tidymodels packages a few times,Q5_9,0,Ignore recipe steps,NA
+R_2uJyHgYQucldYLm,I have used tidymodels packages a few times,Q5_10,0,H2O.ai support ,NA
+R_2uJyHgYQucldYLm,I have used tidymodels packages a few times,Q5_12,100,Other,catboost
+R_2bPm0yHbuv5SECU,I have used tidymodels packages a few times,Q5_1,0,Survival analysis,NA
+R_2bPm0yHbuv5SECU,I have used tidymodels packages a few times,Q5_2,0,Support for sparse data structures,NA
+R_2bPm0yHbuv5SECU,I have used tidymodels packages a few times,Q5_3,0,Adaptive resampling and better parallelization,NA
+R_2bPm0yHbuv5SECU,I have used tidymodels packages a few times,Q5_4,10,"Model monitoring, updating, & organization",NA
+R_2bPm0yHbuv5SECU,I have used tidymodels packages a few times,Q5_5,25,Translate prediction equations,NA
+R_2bPm0yHbuv5SECU,I have used tidymodels packages a few times,Q5_6,10,Model stacking ,NA
+R_2bPm0yHbuv5SECU,I have used tidymodels packages a few times,Q5_8,5,Post-processing in workflow(),NA
+R_2bPm0yHbuv5SECU,I have used tidymodels packages a few times,Q5_9,0,Ignore recipe steps,NA
+R_2bPm0yHbuv5SECU,I have used tidymodels packages a few times,Q5_10,0,H2O.ai support ,NA
+R_2bPm0yHbuv5SECU,I have used tidymodels packages a few times,Q5_12,50,Other,"support for offsets, weights, splines,"
+R_2ePSIdGHAYutv0C,I have used tidymodels packages a few times,Q5_1,20,Survival analysis,NA
+R_2ePSIdGHAYutv0C,I have used tidymodels packages a few times,Q5_2,0,Support for sparse data structures,NA
+R_2ePSIdGHAYutv0C,I have used tidymodels packages a few times,Q5_3,0,Adaptive resampling and better parallelization,NA
+R_2ePSIdGHAYutv0C,I have used tidymodels packages a few times,Q5_4,40,"Model monitoring, updating, & organization",NA
+R_2ePSIdGHAYutv0C,I have used tidymodels packages a few times,Q5_5,0,Translate prediction equations,NA
+R_2ePSIdGHAYutv0C,I have used tidymodels packages a few times,Q5_6,20,Model stacking ,NA
+R_2ePSIdGHAYutv0C,I have used tidymodels packages a few times,Q5_8,10,Post-processing in workflow(),NA
+R_2ePSIdGHAYutv0C,I have used tidymodels packages a few times,Q5_9,10,Ignore recipe steps,NA
+R_2ePSIdGHAYutv0C,I have used tidymodels packages a few times,Q5_10,0,H2O.ai support ,NA
+R_2ePSIdGHAYutv0C,I have used tidymodels packages a few times,Q5_12,0,Other,NA
+R_1jv4qMNEmqh2zza,I have used tidymodels packages many times,Q5_1,5,Survival analysis,NA
+R_1jv4qMNEmqh2zza,I have used tidymodels packages many times,Q5_2,10,Support for sparse data structures,NA
+R_1jv4qMNEmqh2zza,I have used tidymodels packages many times,Q5_3,5,Adaptive resampling and better parallelization,NA
+R_1jv4qMNEmqh2zza,I have used tidymodels packages many times,Q5_4,0,"Model monitoring, updating, & organization",NA
+R_1jv4qMNEmqh2zza,I have used tidymodels packages many times,Q5_5,0,Translate prediction equations,NA
+R_1jv4qMNEmqh2zza,I have used tidymodels packages many times,Q5_6,5,Model stacking ,NA
+R_1jv4qMNEmqh2zza,I have used tidymodels packages many times,Q5_8,35,Post-processing in workflow(),NA
+R_1jv4qMNEmqh2zza,I have used tidymodels packages many times,Q5_9,35,Ignore recipe steps,NA
+R_1jv4qMNEmqh2zza,I have used tidymodels packages many times,Q5_10,5,H2O.ai support ,NA
+R_1jv4qMNEmqh2zza,I have used tidymodels packages many times,Q5_12,0,Other,NA
+R_WdlndAl2a563oRj,I have used tidymodels packages a few times,Q5_1,100,Survival analysis,NA
+R_WdlndAl2a563oRj,I have used tidymodels packages a few times,Q5_2,0,Support for sparse data structures,NA
+R_WdlndAl2a563oRj,I have used tidymodels packages a few times,Q5_3,0,Adaptive resampling and better parallelization,NA
+R_WdlndAl2a563oRj,I have used tidymodels packages a few times,Q5_4,0,"Model monitoring, updating, & organization",NA
+R_WdlndAl2a563oRj,I have used tidymodels packages a few times,Q5_5,0,Translate prediction equations,NA
+R_WdlndAl2a563oRj,I have used tidymodels packages a few times,Q5_6,0,Model stacking ,NA
+R_WdlndAl2a563oRj,I have used tidymodels packages a few times,Q5_8,0,Post-processing in workflow(),NA
+R_WdlndAl2a563oRj,I have used tidymodels packages a few times,Q5_9,0,Ignore recipe steps,NA
+R_WdlndAl2a563oRj,I have used tidymodels packages a few times,Q5_10,0,H2O.ai support ,NA
+R_WdlndAl2a563oRj,I have used tidymodels packages a few times,Q5_12,0,Other,NA
diff --git a/about/surveys/priorities-2022/index.Rmd b/about/surveys/priorities-2022/index.Rmd
new file mode 100644
index 00000000..d885b4f0
--- /dev/null
+++ b/about/surveys/priorities-2022/index.Rmd
@@ -0,0 +1,311 @@
+---
+title: "Priorities for tidymodels 2022"
+author: "Julia Silge"
+date: '`r Sys.Date()`'
+output:
+ html_document:
+ theme: yeti
+ toc: true
+ toc_float: true
+ code_folding: hide
+---
+
+```{r setup, include=FALSE}
+library(knitr)
+knitr::opts_chunk$set(cache = TRUE, warning = FALSE,
+ message = FALSE, echo = TRUE,
+ dpi = 300,
+ fig.width = 8, fig.height = 5)
+library(tidyverse)
+library(silgelib)
+library(scales)
+
+theme_transparent <- function(...) {
+
+ ret <- ggplot2::theme_minimal(...)
+
+ trans_rect <- ggplot2::element_rect(fill = "transparent", colour = NA)
+ ret$panel.background <- trans_rect
+ ret$plot.background <- trans_rect
+ ret$legend.background <- trans_rect
+ ret$legend.key <- trans_rect
+
+ ret
+}
+
+theme_set(theme_plex())
+##theme_set(theme_transparent())
+update_geom_defaults("col", list(fill = "#54B5BF"))
+update_stat_defaults("bin", list(fill = "#54B5BF"))
+
+## if you don't have fancy fonts like IBM Plex installed, run
+## theme_set(theme_minimal())
+```
+
+
+The tidymodels team [fielded a short survey](https://www.tidyverse.org/blog/2021/10/tidymodels-2022-survey/) to gather community feedback on development priorities and possible next steps in 2022. This report summarizes the survey results.
+
+## tl;dr
+
+- Over 600 people responded to our survey (a significant increase from last year).
+- Close to equal proportions say they have used tidymodels packages a _few_ times and _many_ times.
+- About 60% of respondents say they work in industry.
+- The priorities given the most weight by our respondents (across most groups) include supervised feature selection, model fairness metrics, and probability calibrations.
+- Priorities involving H2O and spatial analysis were among the most likely to be given zero weight.
+
+## Exploring the data
+
+Let's start by exploring the characteristics of the survey respondents.
+
+```{r tidy_survey}
+library(tidyverse)
+library(qualtRics)
+library(glue)
+
+survey_id <- "SV_3gtKaK8G1Z1JC50"
+
+survey_raw <- fetch_survey(survey_id, verbose = FALSE, force_request = TRUE) %>%
+ filter(Status != "Survey Preview", Finished)
+
+survey_select <- survey_raw %>%
+ select(Q5_1:Q5_12, Q1002, Q12)
+
+metadata_raw <- metadata(survey_id)
+
+choice_text <- metadata_raw$questions$QID2001$choices %>%
+ map_chr("choiceText")
+
+question_text <- survey_questions(survey_id) %>%
+ filter(qname %in% c("Q1002", "Q12"))
+
+labels_df <-
+ enframe(choice_text) %>%
+ transmute(qname = glue("Q5_{name}"),
+ question = map(value, xml2::read_html)) %>%
+ mutate(question = map(question, xml2::as_list),
+ question = map_chr(question, ~.$html$body$strong[[1]])) %>%
+ bind_rows(question_text)
+
+tidy_survey <- survey_select %>%
+ pivot_longer(Q5_1:Q5_12, names_to = "qname", values_to = "dollars") %>%
+ inner_join(labels_df) %>%
+ filter(question != "Other")
+
+survey_raw %>%
+ count(StartDate = as.Date(StartDate)) %>%
+ ggplot(aes(StartDate, n)) +
+ geom_col(alpha = 0.8) +
+ labs(x = NULL,
+ y = "Number of survey responses",
+ title = "Survey responses over time",
+ subtitle = glue("There are ", {nrow(survey_raw)}, " total responses"))
+
+survey_raw %>%
+ mutate(Q1002 = fct_relabel(Q1002, str_wrap, width = 20)) %>%
+ count(Q1002) %>%
+ ggplot(aes(x = n, y = Q1002)) +
+ geom_col(alpha = 0.8) +
+ scale_x_continuous(expand = c(0,0)) +
+ labs(x = "Number of survey responses",
+ y = NULL,
+ title = "Familiarity with tidymodels",
+ subtitle = glue("Of the respondents, ",
+ {percent(mean(str_detect(survey_raw$Q1002, "a few times")))},
+ " say they have used tidymodels a few times"))
+
+survey_raw %>%
+ filter(`Duration (in seconds)` < 5e4) %>%
+ mutate(Q1002 = fct_relabel(Q1002, str_wrap, width = 20)) %>%
+ ggplot(aes(Q1002, `Duration (in seconds)`, fill = Q1002)) +
+ geom_boxplot(show.legend = FALSE, alpha = 0.7) +
+ scale_y_log10() +
+ labs(x = NULL,
+ y = "Time to take the survey (seconds)",
+ title = "Survey length in seconds",
+ subtitle = glue(
+ "The median time to take the survey was ",
+ {round(median(survey_raw$`Duration (in seconds)`) / 60, 2)},
+ " minutes")
+ )
+
+survey_raw %>%
+ mutate(Q12 = fct_relabel(Q12, str_wrap, width = 20)) %>%
+ count(Q12) %>%
+ ggplot(aes(x = n, y = Q12)) +
+ geom_col(alpha = 0.8) +
+ scale_x_continuous(expand = c(0,0)) +
+ labs(x = "Number of survey responses",
+ y = NULL,
+ title = "Current role",
+ subtitle = glue("Of the respondents, ",
+ {percent(mean(str_detect(survey_raw$Q12, "in industry")))},
+ " say they work in industry"))
+```
+
+
+## Perspectives on priorities
+
+The main question on the survey asked:
+
+> If you had a hypothetical $100 to spend on tidymodels development, how would you allocate those resources right now?
+
+The possible priorities were presented in a randomized order to respondents, except for the "Other" option at the bottom.
+
+## Mean dollars allocated {.tabset}
+
+### Overall
+
+```{r mean_all, dependson="tidy_survey", fig.width=9, fig.height=6}
+tidy_survey %>%
+ mutate(question = str_wrap(question, width = 25)) %>%
+ group_by(question) %>%
+ summarise(dollars_mean = mean(dollars)) %>%
+ mutate(question = fct_reorder(question, dollars_mean)) %>%
+ ggplot(aes(dollars_mean, question)) +
+ geom_col(alpha = 0.8) +
+ scale_x_continuous(labels = dollar_format(),
+ expand = c(0,0)) +
+ labs(x = "Mean hypothetical dollars allocated",
+ y = NULL,
+ title = "What are the average dollars allocated to each priority?",
+ subtitle = "Supervised feature selection and model fairness metrics had the highest mean scores")
+```
+
+### By experience
+
+```{r mean_exp, dependson="tidy_survey", fig.width=10, fig.height=9}
+library(tidytext)
+
+tidy_survey %>%
+ mutate(question = str_wrap(question, width = 25),
+ Q1002 = fct_relabel(Q1002, str_wrap, width = 50)) %>%
+ group_by(Q1002, question) %>%
+ summarise(dollars_mean = mean(dollars)) %>%
+ ungroup %>%
+ mutate(question = reorder_within(question, dollars_mean, as.character(Q1002))) %>%
+ ggplot(aes(dollars_mean, question, fill = Q1002)) +
+ geom_col(alpha = 0.8, show.legend = FALSE) +
+ facet_wrap(~Q1002, scales = "free_y") +
+ scale_x_continuous(labels = dollar_format(),
+ expand = c(0,0)) +
+ scale_y_reordered() +
+ labs(x = "Mean hypothetical dollars allocated",
+ y = NULL,
+ title = "What are the average dollars allocated to each priority?",
+ subtitle = "There are differences for folks who have never used tidymodels")
+```
+
+### By role
+
+```{r mean_role, dependson="tidy_survey", fig.width=10, fig.height=9}
+tidy_survey %>%
+ mutate(question = str_wrap(question, width = 25),
+ Q12 = fct_relabel(Q12, str_wrap, width = 40)) %>%
+ group_by(Q12, question) %>%
+ summarise(dollars_mean = mean(dollars)) %>%
+ ungroup %>%
+ mutate(question = reorder_within(question, dollars_mean, as.character(Q12))) %>%
+ ggplot(aes(dollars_mean, question, fill = Q12)) +
+ geom_col(alpha = 0.8, show.legend = FALSE) +
+ facet_wrap(~Q12, scales = "free_y") +
+ scale_x_continuous(labels = dollar_format(),
+ expand = c(0,0)) +
+ scale_y_reordered() +
+ labs(x = "Mean hypothetical dollars allocated",
+ y = NULL,
+ title = "What are the average dollars allocated to each priority?",
+ subtitle = "Supervised feature selection had the highest mean score for all groups")
+```
+
+
+## Don't spend it all in one place `r emo::ji("dollar")`
+
+How many people gave their entire $100 to one priority? Very few:
+
+```{r dependson="tidy_survey"}
+tidy_survey %>%
+ filter(dollars > 99) %>%
+ count(question, sort = TRUE) %>%
+ kable(col.names = c("Priority", "Number of respondents allocating *all*"))
+```
+
+## Priorities least likely to be chosen {.tabset}
+
+What priorities were people more likely to allocate $0 to?
+
+### Overall
+
+```{r none_all, dependson="tidy_survey", fig.width=9, fig.height=6}
+tidy_survey %>%
+ mutate(question = str_wrap(question, width = 25)) %>%
+ group_by(question) %>%
+ summarise(none = sum(dollars < 1)) %>%
+ ggplot(aes(none, fct_reorder(question, none))) +
+ geom_col(alpha = 0.8) +
+ scale_x_continuous(expand = c(0,0)) +
+ labs(x = "Number of people who allocated nothing",
+ y = NULL,
+ title = "Which priorities were chosen least often?",
+ subtitle = "H2O support and spatial analysis methods were chosen less often")
+```
+
+### By experience
+
+```{r none_exp, dependson="tidy_survey", fig.width=10, fig.height=9}
+tidy_survey %>%
+ mutate(question = str_wrap(question, width = 25),
+ Q1002 = fct_relabel(Q1002, str_wrap, width = 50)) %>%
+ group_by(Q1002, question) %>%
+ summarise(none = sum(dollars < 1)) %>%
+ ungroup %>%
+ mutate(question = reorder_within(question, none, as.character(Q1002))) %>%
+ ggplot(aes(none, question, fill = Q1002)) +
+ geom_col(alpha = 0.8, show.legend = FALSE) +
+ facet_wrap(~Q1002, scales = "free") +
+ scale_x_continuous(expand = c(0,0)) +
+ scale_y_reordered() +
+ labs(x = "Number of people who allocated nothing",
+ y = NULL,
+ title = "Which priorities were chosen least often?",
+ subtitle = "The group that has never used tidymodels is the most different")
+```
+
+### By role
+
+```{r none_role, dependson="tidy_survey", fig.width=10, fig.height=9}
+tidy_survey %>%
+ mutate(question = str_wrap(question, width = 25),
+ Q12 = fct_relabel(Q12, str_wrap, width = 40)) %>%
+ group_by(Q12, question) %>%
+ summarise(none = sum(dollars < 1)) %>%
+ ungroup %>%
+ mutate(question = reorder_within(question, none, as.character(Q12))) %>%
+ ggplot(aes(none, question, fill = Q12)) +
+ geom_col(alpha = 0.8, show.legend = FALSE) +
+ facet_wrap(~Q12, scales = "free") +
+ scale_x_continuous(expand = c(0,0)) +
+ scale_y_reordered() +
+ labs(x = "Number of people who allocated nothing",
+ y = NULL,
+ title = "Which priorities were chosen least often?",
+ subtitle = "Folks in academia and industry are less different than I thought")
+```
+
+
+## Other answers
+
+We offered respondents the opportunity to give us their own ideas for priorities as well. What kinds of options did respondents suggest?
+
+```{r dependson="tidy_survey"}
+library(DT)
+survey_raw %>%
+ filter(!is.na(Q5_12_TEXT)) %>%
+ arrange(Q1002) %>%
+ select(Q1002, Q5_12_TEXT) %>%
+ datatable(colnames = c("Familiarity with tidymodels",
+ "Suggested priority"),
+ options = list(pageLength = 25))
+```
+
+
+Some of these suggestions cover work already planned or in process (survival analysis, deployment, case weights) and some others focus on areas we have already invested in, at least some (model explainability, butcher, torch). These highlight areas where we can develop impactful documentation and/or future work.
diff --git a/about/surveys/priorities-2022/index.html b/about/surveys/priorities-2022/index.html
new file mode 100644
index 00000000..7c92695a
--- /dev/null
+++ b/about/surveys/priorities-2022/index.html
@@ -0,0 +1,640 @@
+
+
+
+
+
+
+
+
+
+
+
+
+
+
+
+Priorities for tidymodels 2022
+
+
+
+
+
+
+
+
+
+
+
+
+
+
+
+
+
+
+
+
+
+
+
+
+
+
+
+
+
+
+
+
+
+
+
+
+
+
+
+
+
+
+
+
+
+
+
+
+
+
+
+
+
+
+
+
+
+
+
+
The tidymodels team fielded a short survey to gather community feedback on development priorities and possible next steps in 2022. This report summarizes the survey results.
+
+
tl;dr
+
+
Over 600 people responded to our survey (a significant increase from last year).
+
Close to equal proportions say they have used tidymodels packages a few times and many times.
+
About 60% of respondents say they work in industry.
+
The priorities given the most weight by our respondents (across most groups) include supervised feature selection, model fairness metrics, and probability calibrations.
+
Priorities involving H2O and spatial analysis were among the most likely to be given zero weight.
+
+
+
+
Exploring the data
+
Let’s start by exploring the characteristics of the survey respondents.
survey_raw %>%
+ mutate(Q1002 = fct_relabel(Q1002, str_wrap, width = 20)) %>%
+ count(Q1002) %>%
+ ggplot(aes(x = n, y = Q1002)) +
+ geom_col(alpha = 0.8) +
+ scale_x_continuous(expand = c(0,0)) +
+ labs(x = "Number of survey responses",
+ y = NULL,
+ title = "Familiarity with tidymodels",
+ subtitle = glue("Of the respondents, ",
+ {percent(mean(str_detect(survey_raw$Q1002, "a few times")))},
+ " say they have used tidymodels a few times"))
+
+
survey_raw %>%
+ filter(`Duration (in seconds)` < 5e4) %>%
+ mutate(Q1002 = fct_relabel(Q1002, str_wrap, width = 20)) %>%
+ ggplot(aes(Q1002, `Duration (in seconds)`, fill = Q1002)) +
+ geom_boxplot(show.legend = FALSE, alpha = 0.7) +
+ scale_y_log10() +
+ labs(x = NULL,
+ y = "Time to take the survey (seconds)",
+ title = "Survey length in seconds",
+ subtitle = glue(
+ "The median time to take the survey was ",
+ {round(median(survey_raw$`Duration (in seconds)`) / 60, 2)},
+ " minutes")
+ )
+
+
survey_raw %>%
+ mutate(Q12 = fct_relabel(Q12, str_wrap, width = 20)) %>%
+ count(Q12) %>%
+ ggplot(aes(x = n, y = Q12)) +
+ geom_col(alpha = 0.8) +
+ scale_x_continuous(expand = c(0,0)) +
+ labs(x = "Number of survey responses",
+ y = NULL,
+ title = "Current role",
+ subtitle = glue("Of the respondents, ",
+ {percent(mean(str_detect(survey_raw$Q12, "in industry")))},
+ " say they work in industry"))
+
+
+
+
Perspectives on priorities
+
The main question on the survey asked:
+
+
If you had a hypothetical $100 to spend on tidymodels development, how would you allocate those resources right now?
+
+
The possible priorities were presented in a randomized order to respondents, except for the “Other” option at the bottom.
+
+
+
Mean dollars allocated
+
+
Overall
+
tidy_survey %>%
+ mutate(question = str_wrap(question, width = 25)) %>%
+ group_by(question) %>%
+ summarise(dollars_mean = mean(dollars)) %>%
+ mutate(question = fct_reorder(question, dollars_mean)) %>%
+ ggplot(aes(dollars_mean, question)) +
+ geom_col(alpha = 0.8) +
+ scale_x_continuous(labels = dollar_format(),
+ expand = c(0,0)) +
+ labs(x = "Mean hypothetical dollars allocated",
+ y = NULL,
+ title = "What are the average dollars allocated to each priority?",
+ subtitle = "Supervised feature selection and model fairness metrics had the highest mean scores")
+
+
+
+
By experience
+
library(tidytext)
+
+tidy_survey %>%
+ mutate(question = str_wrap(question, width = 25),
+ Q1002 = fct_relabel(Q1002, str_wrap, width = 50)) %>%
+ group_by(Q1002, question) %>%
+ summarise(dollars_mean = mean(dollars)) %>%
+ ungroup %>%
+ mutate(question = reorder_within(question, dollars_mean, as.character(Q1002))) %>%
+ ggplot(aes(dollars_mean, question, fill = Q1002)) +
+ geom_col(alpha = 0.8, show.legend = FALSE) +
+ facet_wrap(~Q1002, scales = "free_y") +
+ scale_x_continuous(labels = dollar_format(),
+ expand = c(0,0)) +
+ scale_y_reordered() +
+ labs(x = "Mean hypothetical dollars allocated",
+ y = NULL,
+ title = "What are the average dollars allocated to each priority?",
+ subtitle = "There are differences for folks who have never used tidymodels")
+
+
+
+
By role
+
tidy_survey %>%
+ mutate(question = str_wrap(question, width = 25),
+ Q12 = fct_relabel(Q12, str_wrap, width = 40)) %>%
+ group_by(Q12, question) %>%
+ summarise(dollars_mean = mean(dollars)) %>%
+ ungroup %>%
+ mutate(question = reorder_within(question, dollars_mean, as.character(Q12))) %>%
+ ggplot(aes(dollars_mean, question, fill = Q12)) +
+ geom_col(alpha = 0.8, show.legend = FALSE) +
+ facet_wrap(~Q12, scales = "free_y") +
+ scale_x_continuous(labels = dollar_format(),
+ expand = c(0,0)) +
+ scale_y_reordered() +
+ labs(x = "Mean hypothetical dollars allocated",
+ y = NULL,
+ title = "What are the average dollars allocated to each priority?",
+ subtitle = "Supervised feature selection had the highest mean score for all groups")
+
+
+
+
+
Don’t spend it all in one place 💵
+
How many people gave their entire $100 to one priority? Very few:
Some of these suggestions cover work already planned or in process (survival analysis, deployment, case weights) and some others focus on areas we have already invested in, at least some (model explainability, butcher, torch). These highlight areas where we can develop impactful documentation and/or future work.
+
+
+
+
+
+
+
+
+
+
+
+
+
+
+
+
+
+
+
+
+
+
+
+
+
diff --git a/about/surveys/priorities-2022/index_files/figure-html/mean_all-1.png b/about/surveys/priorities-2022/index_files/figure-html/mean_all-1.png
new file mode 100644
index 00000000..1b540c25
Binary files /dev/null and b/about/surveys/priorities-2022/index_files/figure-html/mean_all-1.png differ
diff --git a/about/surveys/priorities-2022/index_files/figure-html/mean_all-1.svg b/about/surveys/priorities-2022/index_files/figure-html/mean_all-1.svg
new file mode 100644
index 00000000..ff4081ba
--- /dev/null
+++ b/about/surveys/priorities-2022/index_files/figure-html/mean_all-1.svg
@@ -0,0 +1,75 @@
+
+
diff --git a/about/surveys/priorities-2022/index_files/figure-html/mean_exp-1.png b/about/surveys/priorities-2022/index_files/figure-html/mean_exp-1.png
new file mode 100644
index 00000000..55a8c58f
Binary files /dev/null and b/about/surveys/priorities-2022/index_files/figure-html/mean_exp-1.png differ
diff --git a/about/surveys/priorities-2022/index_files/figure-html/mean_exp-1.svg b/about/surveys/priorities-2022/index_files/figure-html/mean_exp-1.svg
new file mode 100644
index 00000000..fbb268c8
--- /dev/null
+++ b/about/surveys/priorities-2022/index_files/figure-html/mean_exp-1.svg
@@ -0,0 +1,261 @@
+
+
diff --git a/about/surveys/priorities-2022/index_files/figure-html/mean_role-1.png b/about/surveys/priorities-2022/index_files/figure-html/mean_role-1.png
new file mode 100644
index 00000000..f330d421
Binary files /dev/null and b/about/surveys/priorities-2022/index_files/figure-html/mean_role-1.png differ
diff --git a/about/surveys/priorities-2022/index_files/figure-html/mean_role-1.svg b/about/surveys/priorities-2022/index_files/figure-html/mean_role-1.svg
new file mode 100644
index 00000000..34ed7ccd
--- /dev/null
+++ b/about/surveys/priorities-2022/index_files/figure-html/mean_role-1.svg
@@ -0,0 +1,255 @@
+
+
diff --git a/about/surveys/priorities-2022/index_files/figure-html/none_all-1.png b/about/surveys/priorities-2022/index_files/figure-html/none_all-1.png
new file mode 100644
index 00000000..19edf429
Binary files /dev/null and b/about/surveys/priorities-2022/index_files/figure-html/none_all-1.png differ
diff --git a/about/surveys/priorities-2022/index_files/figure-html/none_all-1.svg b/about/surveys/priorities-2022/index_files/figure-html/none_all-1.svg
new file mode 100644
index 00000000..71418bde
--- /dev/null
+++ b/about/surveys/priorities-2022/index_files/figure-html/none_all-1.svg
@@ -0,0 +1,75 @@
+
+
diff --git a/about/surveys/priorities-2022/index_files/figure-html/none_exp-1.png b/about/surveys/priorities-2022/index_files/figure-html/none_exp-1.png
new file mode 100644
index 00000000..9cea9017
Binary files /dev/null and b/about/surveys/priorities-2022/index_files/figure-html/none_exp-1.png differ
diff --git a/about/surveys/priorities-2022/index_files/figure-html/none_exp-1.svg b/about/surveys/priorities-2022/index_files/figure-html/none_exp-1.svg
new file mode 100644
index 00000000..d70b8147
--- /dev/null
+++ b/about/surveys/priorities-2022/index_files/figure-html/none_exp-1.svg
@@ -0,0 +1,264 @@
+
+
diff --git a/about/surveys/priorities-2022/index_files/figure-html/none_role-1.png b/about/surveys/priorities-2022/index_files/figure-html/none_role-1.png
new file mode 100644
index 00000000..83b80f17
Binary files /dev/null and b/about/surveys/priorities-2022/index_files/figure-html/none_role-1.png differ
diff --git a/about/surveys/priorities-2022/index_files/figure-html/none_role-1.svg b/about/surveys/priorities-2022/index_files/figure-html/none_role-1.svg
new file mode 100644
index 00000000..a866cd77
--- /dev/null
+++ b/about/surveys/priorities-2022/index_files/figure-html/none_role-1.svg
@@ -0,0 +1,270 @@
+
+
diff --git a/about/surveys/priorities-2022/index_files/figure-html/tidy_survey-1.png b/about/surveys/priorities-2022/index_files/figure-html/tidy_survey-1.png
new file mode 100644
index 00000000..df5409e9
Binary files /dev/null and b/about/surveys/priorities-2022/index_files/figure-html/tidy_survey-1.png differ
diff --git a/about/surveys/priorities-2022/index_files/figure-html/tidy_survey-1.svg b/about/surveys/priorities-2022/index_files/figure-html/tidy_survey-1.svg
new file mode 100644
index 00000000..344938d5
--- /dev/null
+++ b/about/surveys/priorities-2022/index_files/figure-html/tidy_survey-1.svg
@@ -0,0 +1,120 @@
+
+
diff --git a/about/surveys/priorities-2022/index_files/figure-html/tidy_survey-2.png b/about/surveys/priorities-2022/index_files/figure-html/tidy_survey-2.png
new file mode 100644
index 00000000..6925571d
Binary files /dev/null and b/about/surveys/priorities-2022/index_files/figure-html/tidy_survey-2.png differ
diff --git a/about/surveys/priorities-2022/index_files/figure-html/tidy_survey-2.svg b/about/surveys/priorities-2022/index_files/figure-html/tidy_survey-2.svg
new file mode 100644
index 00000000..14d685a0
--- /dev/null
+++ b/about/surveys/priorities-2022/index_files/figure-html/tidy_survey-2.svg
@@ -0,0 +1,74 @@
+
+
diff --git a/about/surveys/priorities-2022/index_files/figure-html/tidy_survey-3.png b/about/surveys/priorities-2022/index_files/figure-html/tidy_survey-3.png
new file mode 100644
index 00000000..b30c9624
Binary files /dev/null and b/about/surveys/priorities-2022/index_files/figure-html/tidy_survey-3.png differ
diff --git a/about/surveys/priorities-2022/index_files/figure-html/tidy_survey-3.svg b/about/surveys/priorities-2022/index_files/figure-html/tidy_survey-3.svg
new file mode 100644
index 00000000..bf0305f7
--- /dev/null
+++ b/about/surveys/priorities-2022/index_files/figure-html/tidy_survey-3.svg
@@ -0,0 +1,106 @@
+
+
diff --git a/about/surveys/priorities-2022/index_files/figure-html/tidy_survey-4.png b/about/surveys/priorities-2022/index_files/figure-html/tidy_survey-4.png
new file mode 100644
index 00000000..af714910
Binary files /dev/null and b/about/surveys/priorities-2022/index_files/figure-html/tidy_survey-4.png differ
diff --git a/about/surveys/priorities-2022/index_files/figure-html/tidy_survey-4.svg b/about/surveys/priorities-2022/index_files/figure-html/tidy_survey-4.svg
new file mode 100644
index 00000000..240de66b
--- /dev/null
+++ b/about/surveys/priorities-2022/index_files/figure-html/tidy_survey-4.svg
@@ -0,0 +1,62 @@
+
+
diff --git a/about/surveys/priorities-2022/results.csv b/about/surveys/priorities-2022/results.csv
new file mode 100644
index 00000000..d75578ce
--- /dev/null
+++ b/about/surveys/priorities-2022/results.csv
@@ -0,0 +1,4881 @@
+ResponseId,Q1002,Q12,qname,dollars,priority,priority_other
+R_em5oFqpMlrWH60N,I have never used tidymodels,I work in industry,Q5_1,0,Model fairness analysis and metrics,NA
+R_em5oFqpMlrWH60N,I have never used tidymodels,I work in industry,Q5_2,0,Supervised feature selection,NA
+R_em5oFqpMlrWH60N,I have never used tidymodels,I work in industry,Q5_3,0,Probability calibration (post modeling),NA
+R_em5oFqpMlrWH60N,I have never used tidymodels,I work in industry,Q5_4,0,Probability threshold optimization,NA
+R_em5oFqpMlrWH60N,I have never used tidymodels,I work in industry,Q5_5,0,Spatial analysis models and methods,NA
+R_em5oFqpMlrWH60N,I have never used tidymodels,I work in industry,Q5_6,0,Better serialization tools ,NA
+R_em5oFqpMlrWH60N,I have never used tidymodels,I work in industry,Q5_10,100,H2O.ai support ,NA
+R_em5oFqpMlrWH60N,I have never used tidymodels,I work in industry,Q5_12,0,Other,NA
+R_2ALLmrcNLaUBit0,I have used tidymodels packages a few times,I work in industry,Q5_1,25,Model fairness analysis and metrics,NA
+R_2ALLmrcNLaUBit0,I have used tidymodels packages a few times,I work in industry,Q5_2,0,Supervised feature selection,NA
+R_2ALLmrcNLaUBit0,I have used tidymodels packages a few times,I work in industry,Q5_3,25,Probability calibration (post modeling),NA
+R_2ALLmrcNLaUBit0,I have used tidymodels packages a few times,I work in industry,Q5_4,0,Probability threshold optimization,NA
+R_2ALLmrcNLaUBit0,I have used tidymodels packages a few times,I work in industry,Q5_5,50,Spatial analysis models and methods,NA
+R_2ALLmrcNLaUBit0,I have used tidymodels packages a few times,I work in industry,Q5_6,0,Better serialization tools ,NA
+R_2ALLmrcNLaUBit0,I have used tidymodels packages a few times,I work in industry,Q5_10,0,H2O.ai support ,NA
+R_2ALLmrcNLaUBit0,I have used tidymodels packages a few times,I work in industry,Q5_12,0,Other,NA
+R_1Ka9KhBoVlqJj0E,I have never used tidymodels,I am a student,Q5_1,10,Model fairness analysis and metrics,NA
+R_1Ka9KhBoVlqJj0E,I have never used tidymodels,I am a student,Q5_2,20,Supervised feature selection,NA
+R_1Ka9KhBoVlqJj0E,I have never used tidymodels,I am a student,Q5_3,10,Probability calibration (post modeling),NA
+R_1Ka9KhBoVlqJj0E,I have never used tidymodels,I am a student,Q5_4,10,Probability threshold optimization,NA
+R_1Ka9KhBoVlqJj0E,I have never used tidymodels,I am a student,Q5_5,25,Spatial analysis models and methods,NA
+R_1Ka9KhBoVlqJj0E,I have never used tidymodels,I am a student,Q5_6,10,Better serialization tools ,NA
+R_1Ka9KhBoVlqJj0E,I have never used tidymodels,I am a student,Q5_10,10,H2O.ai support ,NA
+R_1Ka9KhBoVlqJj0E,I have never used tidymodels,I am a student,Q5_12,5,Other,Ordinal logistic models
+R_2zx6nCf94O4BFaS,I have used tidymodels packages many times,I work in industry,Q5_1,0,Model fairness analysis and metrics,NA
+R_2zx6nCf94O4BFaS,I have used tidymodels packages many times,I work in industry,Q5_2,60,Supervised feature selection,NA
+R_2zx6nCf94O4BFaS,I have used tidymodels packages many times,I work in industry,Q5_3,20,Probability calibration (post modeling),NA
+R_2zx6nCf94O4BFaS,I have used tidymodels packages many times,I work in industry,Q5_4,20,Probability threshold optimization,NA
+R_2zx6nCf94O4BFaS,I have used tidymodels packages many times,I work in industry,Q5_5,0,Spatial analysis models and methods,NA
+R_2zx6nCf94O4BFaS,I have used tidymodels packages many times,I work in industry,Q5_6,0,Better serialization tools ,NA
+R_2zx6nCf94O4BFaS,I have used tidymodels packages many times,I work in industry,Q5_10,0,H2O.ai support ,NA
+R_2zx6nCf94O4BFaS,I have used tidymodels packages many times,I work in industry,Q5_12,0,Other,NA
+R_dnHwgY7yT88EiOd,I have used tidymodels packages many times,I work in industry,Q5_1,0,Model fairness analysis and metrics,NA
+R_dnHwgY7yT88EiOd,I have used tidymodels packages many times,I work in industry,Q5_2,40,Supervised feature selection,NA
+R_dnHwgY7yT88EiOd,I have used tidymodels packages many times,I work in industry,Q5_3,50,Probability calibration (post modeling),NA
+R_dnHwgY7yT88EiOd,I have used tidymodels packages many times,I work in industry,Q5_4,10,Probability threshold optimization,NA
+R_dnHwgY7yT88EiOd,I have used tidymodels packages many times,I work in industry,Q5_5,0,Spatial analysis models and methods,NA
+R_dnHwgY7yT88EiOd,I have used tidymodels packages many times,I work in industry,Q5_6,0,Better serialization tools ,NA
+R_dnHwgY7yT88EiOd,I have used tidymodels packages many times,I work in industry,Q5_10,0,H2O.ai support ,NA
+R_dnHwgY7yT88EiOd,I have used tidymodels packages many times,I work in industry,Q5_12,0,Other,NA
+R_yViLCO9HAjYZ2ed,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_1,10,Model fairness analysis and metrics,NA
+R_yViLCO9HAjYZ2ed,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_2,40,Supervised feature selection,NA
+R_yViLCO9HAjYZ2ed,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_3,10,Probability calibration (post modeling),NA
+R_yViLCO9HAjYZ2ed,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_4,5,Probability threshold optimization,NA
+R_yViLCO9HAjYZ2ed,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_5,10,Spatial analysis models and methods,NA
+R_yViLCO9HAjYZ2ed,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_6,25,Better serialization tools ,NA
+R_yViLCO9HAjYZ2ed,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_10,0,H2O.ai support ,NA
+R_yViLCO9HAjYZ2ed,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_12,0,Other,NA
+R_3hfi2625XfmOBSO,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_1,10,Model fairness analysis and metrics,NA
+R_3hfi2625XfmOBSO,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_2,15,Supervised feature selection,NA
+R_3hfi2625XfmOBSO,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_3,5,Probability calibration (post modeling),NA
+R_3hfi2625XfmOBSO,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_4,5,Probability threshold optimization,NA
+R_3hfi2625XfmOBSO,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_5,0,Spatial analysis models and methods,NA
+R_3hfi2625XfmOBSO,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_6,25,Better serialization tools ,NA
+R_3hfi2625XfmOBSO,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_10,25,H2O.ai support ,NA
+R_3hfi2625XfmOBSO,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_12,15,Other,AutoML - it would be cool to have a package that analyzes data and makes step_ and model suggestions. Might be able to get there with H2O automl support
+R_9sISr4V9EAvJ8s1,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_1,0,Model fairness analysis and metrics,NA
+R_9sISr4V9EAvJ8s1,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_2,35,Supervised feature selection,NA
+R_9sISr4V9EAvJ8s1,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_3,10,Probability calibration (post modeling),NA
+R_9sISr4V9EAvJ8s1,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_4,10,Probability threshold optimization,NA
+R_9sISr4V9EAvJ8s1,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_5,10,Spatial analysis models and methods,NA
+R_9sISr4V9EAvJ8s1,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_6,35,Better serialization tools ,NA
+R_9sISr4V9EAvJ8s1,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_10,0,H2O.ai support ,NA
+R_9sISr4V9EAvJ8s1,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_12,0,Other,NA
+R_1mC2B4mKLXY0ffk,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_1,5,Model fairness analysis and metrics,NA
+R_1mC2B4mKLXY0ffk,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_2,5,Supervised feature selection,NA
+R_1mC2B4mKLXY0ffk,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_3,5,Probability calibration (post modeling),NA
+R_1mC2B4mKLXY0ffk,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_4,5,Probability threshold optimization,NA
+R_1mC2B4mKLXY0ffk,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_5,10,Spatial analysis models and methods,NA
+R_1mC2B4mKLXY0ffk,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_6,40,Better serialization tools ,NA
+R_1mC2B4mKLXY0ffk,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_10,30,H2O.ai support ,NA
+R_1mC2B4mKLXY0ffk,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_12,0,Other,NA
+R_1Cqisg4kCHUkn2O,I have used tidymodels packages many times,I work in industry,Q5_1,10,Model fairness analysis and metrics,NA
+R_1Cqisg4kCHUkn2O,I have used tidymodels packages many times,I work in industry,Q5_2,30,Supervised feature selection,NA
+R_1Cqisg4kCHUkn2O,I have used tidymodels packages many times,I work in industry,Q5_3,0,Probability calibration (post modeling),NA
+R_1Cqisg4kCHUkn2O,I have used tidymodels packages many times,I work in industry,Q5_4,10,Probability threshold optimization,NA
+R_1Cqisg4kCHUkn2O,I have used tidymodels packages many times,I work in industry,Q5_5,10,Spatial analysis models and methods,NA
+R_1Cqisg4kCHUkn2O,I have used tidymodels packages many times,I work in industry,Q5_6,0,Better serialization tools ,NA
+R_1Cqisg4kCHUkn2O,I have used tidymodels packages many times,I work in industry,Q5_10,10,H2O.ai support ,NA
+R_1Cqisg4kCHUkn2O,I have used tidymodels packages many times,I work in industry,Q5_12,30,Other,Incorporating https://github.com/ModelOriented/rSAFE
+R_1kXpVCC9ahPQeSc,I have used tidymodels packages a few times,I work in industry,Q5_1,0,Model fairness analysis and metrics,NA
+R_1kXpVCC9ahPQeSc,I have used tidymodels packages a few times,I work in industry,Q5_2,20,Supervised feature selection,NA
+R_1kXpVCC9ahPQeSc,I have used tidymodels packages a few times,I work in industry,Q5_3,0,Probability calibration (post modeling),NA
+R_1kXpVCC9ahPQeSc,I have used tidymodels packages a few times,I work in industry,Q5_4,20,Probability threshold optimization,NA
+R_1kXpVCC9ahPQeSc,I have used tidymodels packages a few times,I work in industry,Q5_5,0,Spatial analysis models and methods,NA
+R_1kXpVCC9ahPQeSc,I have used tidymodels packages a few times,I work in industry,Q5_6,10,Better serialization tools ,NA
+R_1kXpVCC9ahPQeSc,I have used tidymodels packages a few times,I work in industry,Q5_10,10,H2O.ai support ,NA
+R_1kXpVCC9ahPQeSc,I have used tidymodels packages a few times,I work in industry,Q5_12,40,Other,nested resampling
+R_3GkAAo7lY4b2nu3,I have used tidymodels packages many times,I work in industry,Q5_1,20,Model fairness analysis and metrics,NA
+R_3GkAAo7lY4b2nu3,I have used tidymodels packages many times,I work in industry,Q5_2,20,Supervised feature selection,NA
+R_3GkAAo7lY4b2nu3,I have used tidymodels packages many times,I work in industry,Q5_3,20,Probability calibration (post modeling),NA
+R_3GkAAo7lY4b2nu3,I have used tidymodels packages many times,I work in industry,Q5_4,20,Probability threshold optimization,NA
+R_3GkAAo7lY4b2nu3,I have used tidymodels packages many times,I work in industry,Q5_5,0,Spatial analysis models and methods,NA
+R_3GkAAo7lY4b2nu3,I have used tidymodels packages many times,I work in industry,Q5_6,20,Better serialization tools ,NA
+R_3GkAAo7lY4b2nu3,I have used tidymodels packages many times,I work in industry,Q5_10,0,H2O.ai support ,NA
+R_3GkAAo7lY4b2nu3,I have used tidymodels packages many times,I work in industry,Q5_12,0,Other,NA
+R_3MRJ6QbnSAYb73H,I have used tidymodels packages a few times,I work in industry,Q5_1,20,Model fairness analysis and metrics,NA
+R_3MRJ6QbnSAYb73H,I have used tidymodels packages a few times,I work in industry,Q5_2,10,Supervised feature selection,NA
+R_3MRJ6QbnSAYb73H,I have used tidymodels packages a few times,I work in industry,Q5_3,10,Probability calibration (post modeling),NA
+R_3MRJ6QbnSAYb73H,I have used tidymodels packages a few times,I work in industry,Q5_4,10,Probability threshold optimization,NA
+R_3MRJ6QbnSAYb73H,I have used tidymodels packages a few times,I work in industry,Q5_5,50,Spatial analysis models and methods,NA
+R_3MRJ6QbnSAYb73H,I have used tidymodels packages a few times,I work in industry,Q5_6,0,Better serialization tools ,NA
+R_3MRJ6QbnSAYb73H,I have used tidymodels packages a few times,I work in industry,Q5_10,0,H2O.ai support ,NA
+R_3MRJ6QbnSAYb73H,I have used tidymodels packages a few times,I work in industry,Q5_12,0,Other,NA
+R_2B3S1omN6zZpFag,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_1,40,Model fairness analysis and metrics,NA
+R_2B3S1omN6zZpFag,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_2,0,Supervised feature selection,NA
+R_2B3S1omN6zZpFag,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_3,30,Probability calibration (post modeling),NA
+R_2B3S1omN6zZpFag,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_4,30,Probability threshold optimization,NA
+R_2B3S1omN6zZpFag,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_5,0,Spatial analysis models and methods,NA
+R_2B3S1omN6zZpFag,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_6,0,Better serialization tools ,NA
+R_2B3S1omN6zZpFag,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_10,0,H2O.ai support ,NA
+R_2B3S1omN6zZpFag,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_12,0,Other,NA
+R_31obfO05ia5hEuy,I have used tidymodels packages many times,I work in industry,Q5_1,5,Model fairness analysis and metrics,NA
+R_31obfO05ia5hEuy,I have used tidymodels packages many times,I work in industry,Q5_2,25,Supervised feature selection,NA
+R_31obfO05ia5hEuy,I have used tidymodels packages many times,I work in industry,Q5_3,15,Probability calibration (post modeling),NA
+R_31obfO05ia5hEuy,I have used tidymodels packages many times,I work in industry,Q5_4,15,Probability threshold optimization,NA
+R_31obfO05ia5hEuy,I have used tidymodels packages many times,I work in industry,Q5_5,5,Spatial analysis models and methods,NA
+R_31obfO05ia5hEuy,I have used tidymodels packages many times,I work in industry,Q5_6,20,Better serialization tools ,NA
+R_31obfO05ia5hEuy,I have used tidymodels packages many times,I work in industry,Q5_10,15,H2O.ai support ,NA
+R_31obfO05ia5hEuy,I have used tidymodels packages many times,I work in industry,Q5_12,0,Other,NA
+R_26f0Zndzz3UeXvn,I have contributed to tidymodels packages or taught others how to use them,"I am an academic, professor, and/or researcher",Q5_1,25,Model fairness analysis and metrics,NA
+R_26f0Zndzz3UeXvn,I have contributed to tidymodels packages or taught others how to use them,"I am an academic, professor, and/or researcher",Q5_2,10,Supervised feature selection,NA
+R_26f0Zndzz3UeXvn,I have contributed to tidymodels packages or taught others how to use them,"I am an academic, professor, and/or researcher",Q5_3,25,Probability calibration (post modeling),NA
+R_26f0Zndzz3UeXvn,I have contributed to tidymodels packages or taught others how to use them,"I am an academic, professor, and/or researcher",Q5_4,30,Probability threshold optimization,NA
+R_26f0Zndzz3UeXvn,I have contributed to tidymodels packages or taught others how to use them,"I am an academic, professor, and/or researcher",Q5_5,0,Spatial analysis models and methods,NA
+R_26f0Zndzz3UeXvn,I have contributed to tidymodels packages or taught others how to use them,"I am an academic, professor, and/or researcher",Q5_6,10,Better serialization tools ,NA
+R_26f0Zndzz3UeXvn,I have contributed to tidymodels packages or taught others how to use them,"I am an academic, professor, and/or researcher",Q5_10,0,H2O.ai support ,NA
+R_26f0Zndzz3UeXvn,I have contributed to tidymodels packages or taught others how to use them,"I am an academic, professor, and/or researcher",Q5_12,0,Other,NA
+R_3P68Omfyxsp5pFZ,I have used tidymodels packages a few times,I am a student,Q5_1,15,Model fairness analysis and metrics,NA
+R_3P68Omfyxsp5pFZ,I have used tidymodels packages a few times,I am a student,Q5_2,30,Supervised feature selection,NA
+R_3P68Omfyxsp5pFZ,I have used tidymodels packages a few times,I am a student,Q5_3,15,Probability calibration (post modeling),NA
+R_3P68Omfyxsp5pFZ,I have used tidymodels packages a few times,I am a student,Q5_4,5,Probability threshold optimization,NA
+R_3P68Omfyxsp5pFZ,I have used tidymodels packages a few times,I am a student,Q5_5,10,Spatial analysis models and methods,NA
+R_3P68Omfyxsp5pFZ,I have used tidymodels packages a few times,I am a student,Q5_6,0,Better serialization tools ,NA
+R_3P68Omfyxsp5pFZ,I have used tidymodels packages a few times,I am a student,Q5_10,25,H2O.ai support ,NA
+R_3P68Omfyxsp5pFZ,I have used tidymodels packages a few times,I am a student,Q5_12,0,Other,NA
+R_1LMfsSxd0FEBENd,I have used tidymodels packages many times,I work in industry,Q5_1,20,Model fairness analysis and metrics,NA
+R_1LMfsSxd0FEBENd,I have used tidymodels packages many times,I work in industry,Q5_2,20,Supervised feature selection,NA
+R_1LMfsSxd0FEBENd,I have used tidymodels packages many times,I work in industry,Q5_3,20,Probability calibration (post modeling),NA
+R_1LMfsSxd0FEBENd,I have used tidymodels packages many times,I work in industry,Q5_4,20,Probability threshold optimization,NA
+R_1LMfsSxd0FEBENd,I have used tidymodels packages many times,I work in industry,Q5_5,0,Spatial analysis models and methods,NA
+R_1LMfsSxd0FEBENd,I have used tidymodels packages many times,I work in industry,Q5_6,20,Better serialization tools ,NA
+R_1LMfsSxd0FEBENd,I have used tidymodels packages many times,I work in industry,Q5_10,0,H2O.ai support ,NA
+R_1LMfsSxd0FEBENd,I have used tidymodels packages many times,I work in industry,Q5_12,0,Other,NA
+R_2EsI0famO4lWcvO,I have never used tidymodels,I work in industry,Q5_1,0,Model fairness analysis and metrics,NA
+R_2EsI0famO4lWcvO,I have never used tidymodels,I work in industry,Q5_2,0,Supervised feature selection,NA
+R_2EsI0famO4lWcvO,I have never used tidymodels,I work in industry,Q5_3,0,Probability calibration (post modeling),NA
+R_2EsI0famO4lWcvO,I have never used tidymodels,I work in industry,Q5_4,0,Probability threshold optimization,NA
+R_2EsI0famO4lWcvO,I have never used tidymodels,I work in industry,Q5_5,100,Spatial analysis models and methods,NA
+R_2EsI0famO4lWcvO,I have never used tidymodels,I work in industry,Q5_6,0,Better serialization tools ,NA
+R_2EsI0famO4lWcvO,I have never used tidymodels,I work in industry,Q5_10,0,H2O.ai support ,NA
+R_2EsI0famO4lWcvO,I have never used tidymodels,I work in industry,Q5_12,0,Other,NA
+R_3Ht1WV3H83gHoiy,I have used tidymodels packages many times,I work in industry,Q5_1,30,Model fairness analysis and metrics,NA
+R_3Ht1WV3H83gHoiy,I have used tidymodels packages many times,I work in industry,Q5_2,0,Supervised feature selection,NA
+R_3Ht1WV3H83gHoiy,I have used tidymodels packages many times,I work in industry,Q5_3,0,Probability calibration (post modeling),NA
+R_3Ht1WV3H83gHoiy,I have used tidymodels packages many times,I work in industry,Q5_4,30,Probability threshold optimization,NA
+R_3Ht1WV3H83gHoiy,I have used tidymodels packages many times,I work in industry,Q5_5,0,Spatial analysis models and methods,NA
+R_3Ht1WV3H83gHoiy,I have used tidymodels packages many times,I work in industry,Q5_6,0,Better serialization tools ,NA
+R_3Ht1WV3H83gHoiy,I have used tidymodels packages many times,I work in industry,Q5_10,40,H2O.ai support ,NA
+R_3Ht1WV3H83gHoiy,I have used tidymodels packages many times,I work in industry,Q5_12,0,Other,NA
+R_1qfEcBeLOKJ8uoa,I have used tidymodels packages many times,I work in industry,Q5_1,15,Model fairness analysis and metrics,NA
+R_1qfEcBeLOKJ8uoa,I have used tidymodels packages many times,I work in industry,Q5_2,10,Supervised feature selection,NA
+R_1qfEcBeLOKJ8uoa,I have used tidymodels packages many times,I work in industry,Q5_3,20,Probability calibration (post modeling),NA
+R_1qfEcBeLOKJ8uoa,I have used tidymodels packages many times,I work in industry,Q5_4,35,Probability threshold optimization,NA
+R_1qfEcBeLOKJ8uoa,I have used tidymodels packages many times,I work in industry,Q5_5,5,Spatial analysis models and methods,NA
+R_1qfEcBeLOKJ8uoa,I have used tidymodels packages many times,I work in industry,Q5_6,15,Better serialization tools ,NA
+R_1qfEcBeLOKJ8uoa,I have used tidymodels packages many times,I work in industry,Q5_10,0,H2O.ai support ,NA
+R_1qfEcBeLOKJ8uoa,I have used tidymodels packages many times,I work in industry,Q5_12,0,Other,NA
+R_1lh6u5RGuPIPxUF,I have contributed to tidymodels packages or taught others how to use them,"I am an academic, professor, and/or researcher",Q5_1,25,Model fairness analysis and metrics,NA
+R_1lh6u5RGuPIPxUF,I have contributed to tidymodels packages or taught others how to use them,"I am an academic, professor, and/or researcher",Q5_2,25,Supervised feature selection,NA
+R_1lh6u5RGuPIPxUF,I have contributed to tidymodels packages or taught others how to use them,"I am an academic, professor, and/or researcher",Q5_3,0,Probability calibration (post modeling),NA
+R_1lh6u5RGuPIPxUF,I have contributed to tidymodels packages or taught others how to use them,"I am an academic, professor, and/or researcher",Q5_4,0,Probability threshold optimization,NA
+R_1lh6u5RGuPIPxUF,I have contributed to tidymodels packages or taught others how to use them,"I am an academic, professor, and/or researcher",Q5_5,0,Spatial analysis models and methods,NA
+R_1lh6u5RGuPIPxUF,I have contributed to tidymodels packages or taught others how to use them,"I am an academic, professor, and/or researcher",Q5_6,25,Better serialization tools ,NA
+R_1lh6u5RGuPIPxUF,I have contributed to tidymodels packages or taught others how to use them,"I am an academic, professor, and/or researcher",Q5_10,25,H2O.ai support ,NA
+R_1lh6u5RGuPIPxUF,I have contributed to tidymodels packages or taught others how to use them,"I am an academic, professor, and/or researcher",Q5_12,0,Other,NA
+R_3k84DoWHqXzDkk8,I have used tidymodels packages a few times,I work in industry,Q5_1,40,Model fairness analysis and metrics,NA
+R_3k84DoWHqXzDkk8,I have used tidymodels packages a few times,I work in industry,Q5_2,40,Supervised feature selection,NA
+R_3k84DoWHqXzDkk8,I have used tidymodels packages a few times,I work in industry,Q5_3,0,Probability calibration (post modeling),NA
+R_3k84DoWHqXzDkk8,I have used tidymodels packages a few times,I work in industry,Q5_4,0,Probability threshold optimization,NA
+R_3k84DoWHqXzDkk8,I have used tidymodels packages a few times,I work in industry,Q5_5,0,Spatial analysis models and methods,NA
+R_3k84DoWHqXzDkk8,I have used tidymodels packages a few times,I work in industry,Q5_6,20,Better serialization tools ,NA
+R_3k84DoWHqXzDkk8,I have used tidymodels packages a few times,I work in industry,Q5_10,0,H2O.ai support ,NA
+R_3k84DoWHqXzDkk8,I have used tidymodels packages a few times,I work in industry,Q5_12,0,Other,NA
+R_2ysBlhF7ld1XKcq,I have used tidymodels packages many times,I work in industry,Q5_1,20,Model fairness analysis and metrics,NA
+R_2ysBlhF7ld1XKcq,I have used tidymodels packages many times,I work in industry,Q5_2,0,Supervised feature selection,NA
+R_2ysBlhF7ld1XKcq,I have used tidymodels packages many times,I work in industry,Q5_3,25,Probability calibration (post modeling),NA
+R_2ysBlhF7ld1XKcq,I have used tidymodels packages many times,I work in industry,Q5_4,25,Probability threshold optimization,NA
+R_2ysBlhF7ld1XKcq,I have used tidymodels packages many times,I work in industry,Q5_5,0,Spatial analysis models and methods,NA
+R_2ysBlhF7ld1XKcq,I have used tidymodels packages many times,I work in industry,Q5_6,10,Better serialization tools ,NA
+R_2ysBlhF7ld1XKcq,I have used tidymodels packages many times,I work in industry,Q5_10,0,H2O.ai support ,NA
+R_2ysBlhF7ld1XKcq,I have used tidymodels packages many times,I work in industry,Q5_12,20,Other,MLOps
+R_1EZL9x9RlkwYD11,I have used tidymodels packages a few times,I work in industry,Q5_1,0,Model fairness analysis and metrics,NA
+R_1EZL9x9RlkwYD11,I have used tidymodels packages a few times,I work in industry,Q5_2,20,Supervised feature selection,NA
+R_1EZL9x9RlkwYD11,I have used tidymodels packages a few times,I work in industry,Q5_3,0,Probability calibration (post modeling),NA
+R_1EZL9x9RlkwYD11,I have used tidymodels packages a few times,I work in industry,Q5_4,10,Probability threshold optimization,NA
+R_1EZL9x9RlkwYD11,I have used tidymodels packages a few times,I work in industry,Q5_5,0,Spatial analysis models and methods,NA
+R_1EZL9x9RlkwYD11,I have used tidymodels packages a few times,I work in industry,Q5_6,0,Better serialization tools ,NA
+R_1EZL9x9RlkwYD11,I have used tidymodels packages a few times,I work in industry,Q5_10,10,H2O.ai support ,NA
+R_1EZL9x9RlkwYD11,I have used tidymodels packages a few times,I work in industry,Q5_12,60,Other,alternative interface similar to caret::train with fewer pipes and abstractions
+R_3KZbiCJY5EQ44gk,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_1,6,Model fairness analysis and metrics,NA
+R_3KZbiCJY5EQ44gk,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_2,0,Supervised feature selection,NA
+R_3KZbiCJY5EQ44gk,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_3,90,Probability calibration (post modeling),NA
+R_3KZbiCJY5EQ44gk,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_4,2,Probability threshold optimization,NA
+R_3KZbiCJY5EQ44gk,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_5,0,Spatial analysis models and methods,NA
+R_3KZbiCJY5EQ44gk,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_6,2,Better serialization tools ,NA
+R_3KZbiCJY5EQ44gk,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_10,0,H2O.ai support ,NA
+R_3KZbiCJY5EQ44gk,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_12,0,Other,NA
+R_2EsdQmIULNSrLV5,I have used tidymodels packages many times,I work in industry,Q5_1,40,Model fairness analysis and metrics,NA
+R_2EsdQmIULNSrLV5,I have used tidymodels packages many times,I work in industry,Q5_2,0,Supervised feature selection,NA
+R_2EsdQmIULNSrLV5,I have used tidymodels packages many times,I work in industry,Q5_3,3,Probability calibration (post modeling),NA
+R_2EsdQmIULNSrLV5,I have used tidymodels packages many times,I work in industry,Q5_4,3,Probability threshold optimization,NA
+R_2EsdQmIULNSrLV5,I have used tidymodels packages many times,I work in industry,Q5_5,0,Spatial analysis models and methods,NA
+R_2EsdQmIULNSrLV5,I have used tidymodels packages many times,I work in industry,Q5_6,4,Better serialization tools ,NA
+R_2EsdQmIULNSrLV5,I have used tidymodels packages many times,I work in industry,Q5_10,50,H2O.ai support ,NA
+R_2EsdQmIULNSrLV5,I have used tidymodels packages many times,I work in industry,Q5_12,0,Other,NA
+R_1eLVmEdFAlkemHj,I have used tidymodels packages a few times,I work in industry,Q5_1,20,Model fairness analysis and metrics,NA
+R_1eLVmEdFAlkemHj,I have used tidymodels packages a few times,I work in industry,Q5_2,30,Supervised feature selection,NA
+R_1eLVmEdFAlkemHj,I have used tidymodels packages a few times,I work in industry,Q5_3,50,Probability calibration (post modeling),NA
+R_1eLVmEdFAlkemHj,I have used tidymodels packages a few times,I work in industry,Q5_4,0,Probability threshold optimization,NA
+R_1eLVmEdFAlkemHj,I have used tidymodels packages a few times,I work in industry,Q5_5,0,Spatial analysis models and methods,NA
+R_1eLVmEdFAlkemHj,I have used tidymodels packages a few times,I work in industry,Q5_6,0,Better serialization tools ,NA
+R_1eLVmEdFAlkemHj,I have used tidymodels packages a few times,I work in industry,Q5_10,0,H2O.ai support ,NA
+R_1eLVmEdFAlkemHj,I have used tidymodels packages a few times,I work in industry,Q5_12,0,Other,NA
+R_vHn25wxnUss2GFH,I have used tidymodels packages many times,I work in industry,Q5_1,0,Model fairness analysis and metrics,NA
+R_vHn25wxnUss2GFH,I have used tidymodels packages many times,I work in industry,Q5_2,25,Supervised feature selection,NA
+R_vHn25wxnUss2GFH,I have used tidymodels packages many times,I work in industry,Q5_3,0,Probability calibration (post modeling),NA
+R_vHn25wxnUss2GFH,I have used tidymodels packages many times,I work in industry,Q5_4,25,Probability threshold optimization,NA
+R_vHn25wxnUss2GFH,I have used tidymodels packages many times,I work in industry,Q5_5,10,Spatial analysis models and methods,NA
+R_vHn25wxnUss2GFH,I have used tidymodels packages many times,I work in industry,Q5_6,20,Better serialization tools ,NA
+R_vHn25wxnUss2GFH,I have used tidymodels packages many times,I work in industry,Q5_10,20,H2O.ai support ,NA
+R_vHn25wxnUss2GFH,I have used tidymodels packages many times,I work in industry,Q5_12,0,Other,NA
+R_2sXUdtkU8BWVK0q,I have used tidymodels packages many times,I work in industry,Q5_1,20,Model fairness analysis and metrics,NA
+R_2sXUdtkU8BWVK0q,I have used tidymodels packages many times,I work in industry,Q5_2,20,Supervised feature selection,NA
+R_2sXUdtkU8BWVK0q,I have used tidymodels packages many times,I work in industry,Q5_3,20,Probability calibration (post modeling),NA
+R_2sXUdtkU8BWVK0q,I have used tidymodels packages many times,I work in industry,Q5_4,20,Probability threshold optimization,NA
+R_2sXUdtkU8BWVK0q,I have used tidymodels packages many times,I work in industry,Q5_5,20,Spatial analysis models and methods,NA
+R_2sXUdtkU8BWVK0q,I have used tidymodels packages many times,I work in industry,Q5_6,0,Better serialization tools ,NA
+R_2sXUdtkU8BWVK0q,I have used tidymodels packages many times,I work in industry,Q5_10,0,H2O.ai support ,NA
+R_2sXUdtkU8BWVK0q,I have used tidymodels packages many times,I work in industry,Q5_12,0,Other,NA
+R_ut4ex618pN0XpQJ,I have used tidymodels packages many times,I work in industry,Q5_1,0,Model fairness analysis and metrics,NA
+R_ut4ex618pN0XpQJ,I have used tidymodels packages many times,I work in industry,Q5_2,0,Supervised feature selection,NA
+R_ut4ex618pN0XpQJ,I have used tidymodels packages many times,I work in industry,Q5_3,0,Probability calibration (post modeling),NA
+R_ut4ex618pN0XpQJ,I have used tidymodels packages many times,I work in industry,Q5_4,0,Probability threshold optimization,NA
+R_ut4ex618pN0XpQJ,I have used tidymodels packages many times,I work in industry,Q5_5,0,Spatial analysis models and methods,NA
+R_ut4ex618pN0XpQJ,I have used tidymodels packages many times,I work in industry,Q5_6,0,Better serialization tools ,NA
+R_ut4ex618pN0XpQJ,I have used tidymodels packages many times,I work in industry,Q5_10,100,H2O.ai support ,NA
+R_ut4ex618pN0XpQJ,I have used tidymodels packages many times,I work in industry,Q5_12,0,Other,NA
+R_9sHfq3pbBrMhvpf,I have used tidymodels packages a few times,I work in industry,Q5_1,0,Model fairness analysis and metrics,NA
+R_9sHfq3pbBrMhvpf,I have used tidymodels packages a few times,I work in industry,Q5_2,0,Supervised feature selection,NA
+R_9sHfq3pbBrMhvpf,I have used tidymodels packages a few times,I work in industry,Q5_3,0,Probability calibration (post modeling),NA
+R_9sHfq3pbBrMhvpf,I have used tidymodels packages a few times,I work in industry,Q5_4,0,Probability threshold optimization,NA
+R_9sHfq3pbBrMhvpf,I have used tidymodels packages a few times,I work in industry,Q5_5,0,Spatial analysis models and methods,NA
+R_9sHfq3pbBrMhvpf,I have used tidymodels packages a few times,I work in industry,Q5_6,0,Better serialization tools ,NA
+R_9sHfq3pbBrMhvpf,I have used tidymodels packages a few times,I work in industry,Q5_10,100,H2O.ai support ,NA
+R_9sHfq3pbBrMhvpf,I have used tidymodels packages a few times,I work in industry,Q5_12,0,Other,NA
+R_8dmysaUkasSZ77H,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_1,15,Model fairness analysis and metrics,NA
+R_8dmysaUkasSZ77H,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_2,0,Supervised feature selection,NA
+R_8dmysaUkasSZ77H,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_3,20,Probability calibration (post modeling),NA
+R_8dmysaUkasSZ77H,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_4,55,Probability threshold optimization,NA
+R_8dmysaUkasSZ77H,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_5,0,Spatial analysis models and methods,NA
+R_8dmysaUkasSZ77H,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_6,10,Better serialization tools ,NA
+R_8dmysaUkasSZ77H,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_10,0,H2O.ai support ,NA
+R_8dmysaUkasSZ77H,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_12,0,Other,NA
+R_pGFZXv9DBPToReF,I have used tidymodels packages a few times,I work in industry,Q5_1,30,Model fairness analysis and metrics,NA
+R_pGFZXv9DBPToReF,I have used tidymodels packages a few times,I work in industry,Q5_2,20,Supervised feature selection,NA
+R_pGFZXv9DBPToReF,I have used tidymodels packages a few times,I work in industry,Q5_3,0,Probability calibration (post modeling),NA
+R_pGFZXv9DBPToReF,I have used tidymodels packages a few times,I work in industry,Q5_4,20,Probability threshold optimization,NA
+R_pGFZXv9DBPToReF,I have used tidymodels packages a few times,I work in industry,Q5_5,0,Spatial analysis models and methods,NA
+R_pGFZXv9DBPToReF,I have used tidymodels packages a few times,I work in industry,Q5_6,0,Better serialization tools ,NA
+R_pGFZXv9DBPToReF,I have used tidymodels packages a few times,I work in industry,Q5_10,30,H2O.ai support ,NA
+R_pGFZXv9DBPToReF,I have used tidymodels packages a few times,I work in industry,Q5_12,0,Other,NA
+R_3m30edioIFyhRb3,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_1,10,Model fairness analysis and metrics,NA
+R_3m30edioIFyhRb3,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_2,25,Supervised feature selection,NA
+R_3m30edioIFyhRb3,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_3,10,Probability calibration (post modeling),NA
+R_3m30edioIFyhRb3,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_4,0,Probability threshold optimization,NA
+R_3m30edioIFyhRb3,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_5,30,Spatial analysis models and methods,NA
+R_3m30edioIFyhRb3,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_6,10,Better serialization tools ,NA
+R_3m30edioIFyhRb3,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_10,15,H2O.ai support ,NA
+R_3m30edioIFyhRb3,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_12,0,Other,NA
+R_2cia7nKK5dRQr1o,I have used tidymodels packages a few times,I work in industry,Q5_1,20,Model fairness analysis and metrics,NA
+R_2cia7nKK5dRQr1o,I have used tidymodels packages a few times,I work in industry,Q5_2,20,Supervised feature selection,NA
+R_2cia7nKK5dRQr1o,I have used tidymodels packages a few times,I work in industry,Q5_3,15,Probability calibration (post modeling),NA
+R_2cia7nKK5dRQr1o,I have used tidymodels packages a few times,I work in industry,Q5_4,20,Probability threshold optimization,NA
+R_2cia7nKK5dRQr1o,I have used tidymodels packages a few times,I work in industry,Q5_5,20,Spatial analysis models and methods,NA
+R_2cia7nKK5dRQr1o,I have used tidymodels packages a few times,I work in industry,Q5_6,5,Better serialization tools ,NA
+R_2cia7nKK5dRQr1o,I have used tidymodels packages a few times,I work in industry,Q5_10,0,H2O.ai support ,NA
+R_2cia7nKK5dRQr1o,I have used tidymodels packages a few times,I work in industry,Q5_12,0,Other,NA
+R_2Y3t3VzXoUFNemL,I have used tidymodels packages many times,I work in industry,Q5_1,0,Model fairness analysis and metrics,NA
+R_2Y3t3VzXoUFNemL,I have used tidymodels packages many times,I work in industry,Q5_2,20,Supervised feature selection,NA
+R_2Y3t3VzXoUFNemL,I have used tidymodels packages many times,I work in industry,Q5_3,20,Probability calibration (post modeling),NA
+R_2Y3t3VzXoUFNemL,I have used tidymodels packages many times,I work in industry,Q5_4,10,Probability threshold optimization,NA
+R_2Y3t3VzXoUFNemL,I have used tidymodels packages many times,I work in industry,Q5_5,0,Spatial analysis models and methods,NA
+R_2Y3t3VzXoUFNemL,I have used tidymodels packages many times,I work in industry,Q5_6,0,Better serialization tools ,NA
+R_2Y3t3VzXoUFNemL,I have used tidymodels packages many times,I work in industry,Q5_10,20,H2O.ai support ,NA
+R_2Y3t3VzXoUFNemL,I have used tidymodels packages many times,I work in industry,Q5_12,30,Other,Tensorflow support
+R_rpqN77x1UOiQD4t,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_1,20,Model fairness analysis and metrics,NA
+R_rpqN77x1UOiQD4t,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_2,35,Supervised feature selection,NA
+R_rpqN77x1UOiQD4t,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_3,5,Probability calibration (post modeling),NA
+R_rpqN77x1UOiQD4t,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_4,10,Probability threshold optimization,NA
+R_rpqN77x1UOiQD4t,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_5,5,Spatial analysis models and methods,NA
+R_rpqN77x1UOiQD4t,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_6,10,Better serialization tools ,NA
+R_rpqN77x1UOiQD4t,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_10,15,H2O.ai support ,NA
+R_rpqN77x1UOiQD4t,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_12,0,Other,NA
+R_1Du2bIYsYMcQ1IB,I have used tidymodels packages many times,I am a student,Q5_1,10,Model fairness analysis and metrics,NA
+R_1Du2bIYsYMcQ1IB,I have used tidymodels packages many times,I am a student,Q5_2,0,Supervised feature selection,NA
+R_1Du2bIYsYMcQ1IB,I have used tidymodels packages many times,I am a student,Q5_3,25,Probability calibration (post modeling),NA
+R_1Du2bIYsYMcQ1IB,I have used tidymodels packages many times,I am a student,Q5_4,35,Probability threshold optimization,NA
+R_1Du2bIYsYMcQ1IB,I have used tidymodels packages many times,I am a student,Q5_5,0,Spatial analysis models and methods,NA
+R_1Du2bIYsYMcQ1IB,I have used tidymodels packages many times,I am a student,Q5_6,30,Better serialization tools ,NA
+R_1Du2bIYsYMcQ1IB,I have used tidymodels packages many times,I am a student,Q5_10,0,H2O.ai support ,NA
+R_1Du2bIYsYMcQ1IB,I have used tidymodels packages many times,I am a student,Q5_12,0,Other,NA
+R_x0pMSdAJCEtQIeJ,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_1,50,Model fairness analysis and metrics,NA
+R_x0pMSdAJCEtQIeJ,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_2,40,Supervised feature selection,NA
+R_x0pMSdAJCEtQIeJ,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_3,10,Probability calibration (post modeling),NA
+R_x0pMSdAJCEtQIeJ,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_4,0,Probability threshold optimization,NA
+R_x0pMSdAJCEtQIeJ,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_5,0,Spatial analysis models and methods,NA
+R_x0pMSdAJCEtQIeJ,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_6,0,Better serialization tools ,NA
+R_x0pMSdAJCEtQIeJ,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_10,0,H2O.ai support ,NA
+R_x0pMSdAJCEtQIeJ,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_12,0,Other,NA
+R_1PemOMKELHJ2pBA,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_1,0,Model fairness analysis and metrics,NA
+R_1PemOMKELHJ2pBA,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_2,30,Supervised feature selection,NA
+R_1PemOMKELHJ2pBA,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_3,40,Probability calibration (post modeling),NA
+R_1PemOMKELHJ2pBA,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_4,0,Probability threshold optimization,NA
+R_1PemOMKELHJ2pBA,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_5,30,Spatial analysis models and methods,NA
+R_1PemOMKELHJ2pBA,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_6,0,Better serialization tools ,NA
+R_1PemOMKELHJ2pBA,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_10,0,H2O.ai support ,NA
+R_1PemOMKELHJ2pBA,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_12,0,Other,NA
+R_3RmSEQQfJ3UD1oP,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_1,0,Model fairness analysis and metrics,NA
+R_3RmSEQQfJ3UD1oP,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_2,30,Supervised feature selection,NA
+R_3RmSEQQfJ3UD1oP,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_3,10,Probability calibration (post modeling),NA
+R_3RmSEQQfJ3UD1oP,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_4,0,Probability threshold optimization,NA
+R_3RmSEQQfJ3UD1oP,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_5,0,Spatial analysis models and methods,NA
+R_3RmSEQQfJ3UD1oP,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_6,60,Better serialization tools ,NA
+R_3RmSEQQfJ3UD1oP,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_10,0,H2O.ai support ,NA
+R_3RmSEQQfJ3UD1oP,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_12,0,Other,NA
+R_3NwDDqvzDQsRX7V,I have used tidymodels packages a few times,I work in industry,Q5_1,0,Model fairness analysis and metrics,NA
+R_3NwDDqvzDQsRX7V,I have used tidymodels packages a few times,I work in industry,Q5_2,10,Supervised feature selection,NA
+R_3NwDDqvzDQsRX7V,I have used tidymodels packages a few times,I work in industry,Q5_3,0,Probability calibration (post modeling),NA
+R_3NwDDqvzDQsRX7V,I have used tidymodels packages a few times,I work in industry,Q5_4,0,Probability threshold optimization,NA
+R_3NwDDqvzDQsRX7V,I have used tidymodels packages a few times,I work in industry,Q5_5,70,Spatial analysis models and methods,NA
+R_3NwDDqvzDQsRX7V,I have used tidymodels packages a few times,I work in industry,Q5_6,0,Better serialization tools ,NA
+R_3NwDDqvzDQsRX7V,I have used tidymodels packages a few times,I work in industry,Q5_10,20,H2O.ai support ,NA
+R_3NwDDqvzDQsRX7V,I have used tidymodels packages a few times,I work in industry,Q5_12,0,Other,NA
+R_1nPa2ZuVqWYyQ4A,I have contributed to tidymodels packages or taught others how to use them,"I am an academic, professor, and/or researcher",Q5_1,20,Model fairness analysis and metrics,NA
+R_1nPa2ZuVqWYyQ4A,I have contributed to tidymodels packages or taught others how to use them,"I am an academic, professor, and/or researcher",Q5_2,40,Supervised feature selection,NA
+R_1nPa2ZuVqWYyQ4A,I have contributed to tidymodels packages or taught others how to use them,"I am an academic, professor, and/or researcher",Q5_3,0,Probability calibration (post modeling),NA
+R_1nPa2ZuVqWYyQ4A,I have contributed to tidymodels packages or taught others how to use them,"I am an academic, professor, and/or researcher",Q5_4,20,Probability threshold optimization,NA
+R_1nPa2ZuVqWYyQ4A,I have contributed to tidymodels packages or taught others how to use them,"I am an academic, professor, and/or researcher",Q5_5,20,Spatial analysis models and methods,NA
+R_1nPa2ZuVqWYyQ4A,I have contributed to tidymodels packages or taught others how to use them,"I am an academic, professor, and/or researcher",Q5_6,0,Better serialization tools ,NA
+R_1nPa2ZuVqWYyQ4A,I have contributed to tidymodels packages or taught others how to use them,"I am an academic, professor, and/or researcher",Q5_10,0,H2O.ai support ,NA
+R_1nPa2ZuVqWYyQ4A,I have contributed to tidymodels packages or taught others how to use them,"I am an academic, professor, and/or researcher",Q5_12,0,Other,NA
+R_2wagwFytBOm6O8d,I have used tidymodels packages a few times,I am a student,Q5_1,50,Model fairness analysis and metrics,NA
+R_2wagwFytBOm6O8d,I have used tidymodels packages a few times,I am a student,Q5_2,25,Supervised feature selection,NA
+R_2wagwFytBOm6O8d,I have used tidymodels packages a few times,I am a student,Q5_3,0,Probability calibration (post modeling),NA
+R_2wagwFytBOm6O8d,I have used tidymodels packages a few times,I am a student,Q5_4,25,Probability threshold optimization,NA
+R_2wagwFytBOm6O8d,I have used tidymodels packages a few times,I am a student,Q5_5,0,Spatial analysis models and methods,NA
+R_2wagwFytBOm6O8d,I have used tidymodels packages a few times,I am a student,Q5_6,0,Better serialization tools ,NA
+R_2wagwFytBOm6O8d,I have used tidymodels packages a few times,I am a student,Q5_10,0,H2O.ai support ,NA
+R_2wagwFytBOm6O8d,I have used tidymodels packages a few times,I am a student,Q5_12,0,Other,NA
+R_3DoHElbpSazV9cM,I have used tidymodels packages many times,I work in industry,Q5_1,25,Model fairness analysis and metrics,NA
+R_3DoHElbpSazV9cM,I have used tidymodels packages many times,I work in industry,Q5_2,25,Supervised feature selection,NA
+R_3DoHElbpSazV9cM,I have used tidymodels packages many times,I work in industry,Q5_3,0,Probability calibration (post modeling),NA
+R_3DoHElbpSazV9cM,I have used tidymodels packages many times,I work in industry,Q5_4,25,Probability threshold optimization,NA
+R_3DoHElbpSazV9cM,I have used tidymodels packages many times,I work in industry,Q5_5,0,Spatial analysis models and methods,NA
+R_3DoHElbpSazV9cM,I have used tidymodels packages many times,I work in industry,Q5_6,25,Better serialization tools ,NA
+R_3DoHElbpSazV9cM,I have used tidymodels packages many times,I work in industry,Q5_10,0,H2O.ai support ,NA
+R_3DoHElbpSazV9cM,I have used tidymodels packages many times,I work in industry,Q5_12,0,Other,NA
+R_3p45vPiKzzR7kZ8,I have used tidymodels packages many times,I work in industry,Q5_1,20,Model fairness analysis and metrics,NA
+R_3p45vPiKzzR7kZ8,I have used tidymodels packages many times,I work in industry,Q5_2,15,Supervised feature selection,NA
+R_3p45vPiKzzR7kZ8,I have used tidymodels packages many times,I work in industry,Q5_3,20,Probability calibration (post modeling),NA
+R_3p45vPiKzzR7kZ8,I have used tidymodels packages many times,I work in industry,Q5_4,20,Probability threshold optimization,NA
+R_3p45vPiKzzR7kZ8,I have used tidymodels packages many times,I work in industry,Q5_5,15,Spatial analysis models and methods,NA
+R_3p45vPiKzzR7kZ8,I have used tidymodels packages many times,I work in industry,Q5_6,10,Better serialization tools ,NA
+R_3p45vPiKzzR7kZ8,I have used tidymodels packages many times,I work in industry,Q5_10,0,H2O.ai support ,NA
+R_3p45vPiKzzR7kZ8,I have used tidymodels packages many times,I work in industry,Q5_12,0,Other,NA
+R_1l5Zu1iUJpzdiqy,I have used tidymodels packages many times,I work in industry,Q5_1,50,Model fairness analysis and metrics,NA
+R_1l5Zu1iUJpzdiqy,I have used tidymodels packages many times,I work in industry,Q5_2,0,Supervised feature selection,NA
+R_1l5Zu1iUJpzdiqy,I have used tidymodels packages many times,I work in industry,Q5_3,0,Probability calibration (post modeling),NA
+R_1l5Zu1iUJpzdiqy,I have used tidymodels packages many times,I work in industry,Q5_4,50,Probability threshold optimization,NA
+R_1l5Zu1iUJpzdiqy,I have used tidymodels packages many times,I work in industry,Q5_5,0,Spatial analysis models and methods,NA
+R_1l5Zu1iUJpzdiqy,I have used tidymodels packages many times,I work in industry,Q5_6,0,Better serialization tools ,NA
+R_1l5Zu1iUJpzdiqy,I have used tidymodels packages many times,I work in industry,Q5_10,0,H2O.ai support ,NA
+R_1l5Zu1iUJpzdiqy,I have used tidymodels packages many times,I work in industry,Q5_12,0,Other,NA
+R_ykkzJfS52aXhI3v,I have used tidymodels packages a few times,I work in industry,Q5_1,0,Model fairness analysis and metrics,NA
+R_ykkzJfS52aXhI3v,I have used tidymodels packages a few times,I work in industry,Q5_2,0,Supervised feature selection,NA
+R_ykkzJfS52aXhI3v,I have used tidymodels packages a few times,I work in industry,Q5_3,0,Probability calibration (post modeling),NA
+R_ykkzJfS52aXhI3v,I have used tidymodels packages a few times,I work in industry,Q5_4,0,Probability threshold optimization,NA
+R_ykkzJfS52aXhI3v,I have used tidymodels packages a few times,I work in industry,Q5_5,0,Spatial analysis models and methods,NA
+R_ykkzJfS52aXhI3v,I have used tidymodels packages a few times,I work in industry,Q5_6,0,Better serialization tools ,NA
+R_ykkzJfS52aXhI3v,I have used tidymodels packages a few times,I work in industry,Q5_10,30,H2O.ai support ,NA
+R_ykkzJfS52aXhI3v,I have used tidymodels packages a few times,I work in industry,Q5_12,70,Other,Multi-label classification
+R_3noQzmO6IIaXG5K,I have used tidymodels packages many times,I am a hobbyist,Q5_1,10,Model fairness analysis and metrics,NA
+R_3noQzmO6IIaXG5K,I have used tidymodels packages many times,I am a hobbyist,Q5_2,25,Supervised feature selection,NA
+R_3noQzmO6IIaXG5K,I have used tidymodels packages many times,I am a hobbyist,Q5_3,10,Probability calibration (post modeling),NA
+R_3noQzmO6IIaXG5K,I have used tidymodels packages many times,I am a hobbyist,Q5_4,10,Probability threshold optimization,NA
+R_3noQzmO6IIaXG5K,I have used tidymodels packages many times,I am a hobbyist,Q5_5,10,Spatial analysis models and methods,NA
+R_3noQzmO6IIaXG5K,I have used tidymodels packages many times,I am a hobbyist,Q5_6,10,Better serialization tools ,NA
+R_3noQzmO6IIaXG5K,I have used tidymodels packages many times,I am a hobbyist,Q5_10,25,H2O.ai support ,NA
+R_3noQzmO6IIaXG5K,I have used tidymodels packages many times,I am a hobbyist,Q5_12,0,Other,NA
+R_25XdiASNRWZkpzW,I have used tidymodels packages many times,I work in industry,Q5_1,0,Model fairness analysis and metrics,NA
+R_25XdiASNRWZkpzW,I have used tidymodels packages many times,I work in industry,Q5_2,0,Supervised feature selection,NA
+R_25XdiASNRWZkpzW,I have used tidymodels packages many times,I work in industry,Q5_3,30,Probability calibration (post modeling),NA
+R_25XdiASNRWZkpzW,I have used tidymodels packages many times,I work in industry,Q5_4,0,Probability threshold optimization,NA
+R_25XdiASNRWZkpzW,I have used tidymodels packages many times,I work in industry,Q5_5,40,Spatial analysis models and methods,NA
+R_25XdiASNRWZkpzW,I have used tidymodels packages many times,I work in industry,Q5_6,20,Better serialization tools ,NA
+R_25XdiASNRWZkpzW,I have used tidymodels packages many times,I work in industry,Q5_10,10,H2O.ai support ,NA
+R_25XdiASNRWZkpzW,I have used tidymodels packages many times,I work in industry,Q5_12,0,Other,NA
+R_1Lcijy9bsmn9j2f,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_1,10,Model fairness analysis and metrics,NA
+R_1Lcijy9bsmn9j2f,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_2,5,Supervised feature selection,NA
+R_1Lcijy9bsmn9j2f,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_3,10,Probability calibration (post modeling),NA
+R_1Lcijy9bsmn9j2f,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_4,5,Probability threshold optimization,NA
+R_1Lcijy9bsmn9j2f,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_5,40,Spatial analysis models and methods,NA
+R_1Lcijy9bsmn9j2f,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_6,15,Better serialization tools ,NA
+R_1Lcijy9bsmn9j2f,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_10,15,H2O.ai support ,NA
+R_1Lcijy9bsmn9j2f,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_12,0,Other,NA
+R_1H2aes6oTOq6QZN,I have used tidymodels packages many times,I work in industry,Q5_1,0,Model fairness analysis and metrics,NA
+R_1H2aes6oTOq6QZN,I have used tidymodels packages many times,I work in industry,Q5_2,25,Supervised feature selection,NA
+R_1H2aes6oTOq6QZN,I have used tidymodels packages many times,I work in industry,Q5_3,10,Probability calibration (post modeling),NA
+R_1H2aes6oTOq6QZN,I have used tidymodels packages many times,I work in industry,Q5_4,25,Probability threshold optimization,NA
+R_1H2aes6oTOq6QZN,I have used tidymodels packages many times,I work in industry,Q5_5,0,Spatial analysis models and methods,NA
+R_1H2aes6oTOq6QZN,I have used tidymodels packages many times,I work in industry,Q5_6,10,Better serialization tools ,NA
+R_1H2aes6oTOq6QZN,I have used tidymodels packages many times,I work in industry,Q5_10,30,H2O.ai support ,NA
+R_1H2aes6oTOq6QZN,I have used tidymodels packages many times,I work in industry,Q5_12,0,Other,NA
+R_pmYh8L7Wk82otDH,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_1,0,Model fairness analysis and metrics,NA
+R_pmYh8L7Wk82otDH,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_2,90,Supervised feature selection,NA
+R_pmYh8L7Wk82otDH,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_3,0,Probability calibration (post modeling),NA
+R_pmYh8L7Wk82otDH,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_4,10,Probability threshold optimization,NA
+R_pmYh8L7Wk82otDH,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_5,0,Spatial analysis models and methods,NA
+R_pmYh8L7Wk82otDH,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_6,0,Better serialization tools ,NA
+R_pmYh8L7Wk82otDH,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_10,0,H2O.ai support ,NA
+R_pmYh8L7Wk82otDH,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_12,0,Other,NA
+R_2zMDMiQ0sPb5wYs,I have used tidymodels packages many times,I work in industry,Q5_1,0,Model fairness analysis and metrics,NA
+R_2zMDMiQ0sPb5wYs,I have used tidymodels packages many times,I work in industry,Q5_2,0,Supervised feature selection,NA
+R_2zMDMiQ0sPb5wYs,I have used tidymodels packages many times,I work in industry,Q5_3,10,Probability calibration (post modeling),NA
+R_2zMDMiQ0sPb5wYs,I have used tidymodels packages many times,I work in industry,Q5_4,30,Probability threshold optimization,NA
+R_2zMDMiQ0sPb5wYs,I have used tidymodels packages many times,I work in industry,Q5_5,0,Spatial analysis models and methods,NA
+R_2zMDMiQ0sPb5wYs,I have used tidymodels packages many times,I work in industry,Q5_6,60,Better serialization tools ,NA
+R_2zMDMiQ0sPb5wYs,I have used tidymodels packages many times,I work in industry,Q5_10,0,H2O.ai support ,NA
+R_2zMDMiQ0sPb5wYs,I have used tidymodels packages many times,I work in industry,Q5_12,0,Other,NA
+R_2BmkjlK1YiSGKuo,I have used tidymodels packages many times,I am a student,Q5_1,5,Model fairness analysis and metrics,NA
+R_2BmkjlK1YiSGKuo,I have used tidymodels packages many times,I am a student,Q5_2,5,Supervised feature selection,NA
+R_2BmkjlK1YiSGKuo,I have used tidymodels packages many times,I am a student,Q5_3,0,Probability calibration (post modeling),NA
+R_2BmkjlK1YiSGKuo,I have used tidymodels packages many times,I am a student,Q5_4,5,Probability threshold optimization,NA
+R_2BmkjlK1YiSGKuo,I have used tidymodels packages many times,I am a student,Q5_5,5,Spatial analysis models and methods,NA
+R_2BmkjlK1YiSGKuo,I have used tidymodels packages many times,I am a student,Q5_6,20,Better serialization tools ,NA
+R_2BmkjlK1YiSGKuo,I have used tidymodels packages many times,I am a student,Q5_10,60,H2O.ai support ,NA
+R_2BmkjlK1YiSGKuo,I have used tidymodels packages many times,I am a student,Q5_12,0,Other,NA
+R_12gsk9qtcr3LXbf,I have used tidymodels packages many times,I work in industry,Q5_1,10,Model fairness analysis and metrics,NA
+R_12gsk9qtcr3LXbf,I have used tidymodels packages many times,I work in industry,Q5_2,30,Supervised feature selection,NA
+R_12gsk9qtcr3LXbf,I have used tidymodels packages many times,I work in industry,Q5_3,30,Probability calibration (post modeling),NA
+R_12gsk9qtcr3LXbf,I have used tidymodels packages many times,I work in industry,Q5_4,5,Probability threshold optimization,NA
+R_12gsk9qtcr3LXbf,I have used tidymodels packages many times,I work in industry,Q5_5,5,Spatial analysis models and methods,NA
+R_12gsk9qtcr3LXbf,I have used tidymodels packages many times,I work in industry,Q5_6,20,Better serialization tools ,NA
+R_12gsk9qtcr3LXbf,I have used tidymodels packages many times,I work in industry,Q5_10,0,H2O.ai support ,NA
+R_12gsk9qtcr3LXbf,I have used tidymodels packages many times,I work in industry,Q5_12,0,Other,NA
+R_3J8idpAkh27aazm,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_1,30,Model fairness analysis and metrics,NA
+R_3J8idpAkh27aazm,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_2,10,Supervised feature selection,NA
+R_3J8idpAkh27aazm,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_3,10,Probability calibration (post modeling),NA
+R_3J8idpAkh27aazm,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_4,10,Probability threshold optimization,NA
+R_3J8idpAkh27aazm,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_5,20,Spatial analysis models and methods,NA
+R_3J8idpAkh27aazm,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_6,15,Better serialization tools ,NA
+R_3J8idpAkh27aazm,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_10,5,H2O.ai support ,NA
+R_3J8idpAkh27aazm,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_12,0,Other,NA
+R_3kzkH35zohbmT7Z,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_1,0,Model fairness analysis and metrics,NA
+R_3kzkH35zohbmT7Z,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_2,0,Supervised feature selection,NA
+R_3kzkH35zohbmT7Z,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_3,0,Probability calibration (post modeling),NA
+R_3kzkH35zohbmT7Z,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_4,0,Probability threshold optimization,NA
+R_3kzkH35zohbmT7Z,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_5,100,Spatial analysis models and methods,NA
+R_3kzkH35zohbmT7Z,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_6,0,Better serialization tools ,NA
+R_3kzkH35zohbmT7Z,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_10,0,H2O.ai support ,NA
+R_3kzkH35zohbmT7Z,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_12,0,Other,NA
+R_3m2yMzdKC2Sh6xd,I have used tidymodels packages many times,I work in industry,Q5_1,0,Model fairness analysis and metrics,NA
+R_3m2yMzdKC2Sh6xd,I have used tidymodels packages many times,I work in industry,Q5_2,0,Supervised feature selection,NA
+R_3m2yMzdKC2Sh6xd,I have used tidymodels packages many times,I work in industry,Q5_3,10,Probability calibration (post modeling),NA
+R_3m2yMzdKC2Sh6xd,I have used tidymodels packages many times,I work in industry,Q5_4,0,Probability threshold optimization,NA
+R_3m2yMzdKC2Sh6xd,I have used tidymodels packages many times,I work in industry,Q5_5,0,Spatial analysis models and methods,NA
+R_3m2yMzdKC2Sh6xd,I have used tidymodels packages many times,I work in industry,Q5_6,10,Better serialization tools ,NA
+R_3m2yMzdKC2Sh6xd,I have used tidymodels packages many times,I work in industry,Q5_10,30,H2O.ai support ,NA
+R_3m2yMzdKC2Sh6xd,I have used tidymodels packages many times,I work in industry,Q5_12,50,Other,Uncertainty estimates for point predictions (through conformal predictions)
+R_2dGzaJBC9AWVOnV,I have contributed to tidymodels packages or taught others how to use them,"I am an academic, professor, and/or researcher",Q5_1,0,Model fairness analysis and metrics,NA
+R_2dGzaJBC9AWVOnV,I have contributed to tidymodels packages or taught others how to use them,"I am an academic, professor, and/or researcher",Q5_2,0,Supervised feature selection,NA
+R_2dGzaJBC9AWVOnV,I have contributed to tidymodels packages or taught others how to use them,"I am an academic, professor, and/or researcher",Q5_3,0,Probability calibration (post modeling),NA
+R_2dGzaJBC9AWVOnV,I have contributed to tidymodels packages or taught others how to use them,"I am an academic, professor, and/or researcher",Q5_4,0,Probability threshold optimization,NA
+R_2dGzaJBC9AWVOnV,I have contributed to tidymodels packages or taught others how to use them,"I am an academic, professor, and/or researcher",Q5_5,0,Spatial analysis models and methods,NA
+R_2dGzaJBC9AWVOnV,I have contributed to tidymodels packages or taught others how to use them,"I am an academic, professor, and/or researcher",Q5_6,0,Better serialization tools ,NA
+R_2dGzaJBC9AWVOnV,I have contributed to tidymodels packages or taught others how to use them,"I am an academic, professor, and/or researcher",Q5_10,0,H2O.ai support ,NA
+R_2dGzaJBC9AWVOnV,I have contributed to tidymodels packages or taught others how to use them,"I am an academic, professor, and/or researcher",Q5_12,100,Other,"1) More models, such as those in caret. 2) Models from scikit-learn."
+R_2vcqPAi16g08H6O,I have used tidymodels packages many times,I work in industry,Q5_1,0,Model fairness analysis and metrics,NA
+R_2vcqPAi16g08H6O,I have used tidymodels packages many times,I work in industry,Q5_2,5,Supervised feature selection,NA
+R_2vcqPAi16g08H6O,I have used tidymodels packages many times,I work in industry,Q5_3,30,Probability calibration (post modeling),NA
+R_2vcqPAi16g08H6O,I have used tidymodels packages many times,I work in industry,Q5_4,10,Probability threshold optimization,NA
+R_2vcqPAi16g08H6O,I have used tidymodels packages many times,I work in industry,Q5_5,5,Spatial analysis models and methods,NA
+R_2vcqPAi16g08H6O,I have used tidymodels packages many times,I work in industry,Q5_6,10,Better serialization tools ,NA
+R_2vcqPAi16g08H6O,I have used tidymodels packages many times,I work in industry,Q5_10,20,H2O.ai support ,NA
+R_2vcqPAi16g08H6O,I have used tidymodels packages many times,I work in industry,Q5_12,20,Other,ِModel Performance
+R_2yl8rFix7oPCkZD,I have used tidymodels packages a few times,I work in industry,Q5_1,0,Model fairness analysis and metrics,NA
+R_2yl8rFix7oPCkZD,I have used tidymodels packages a few times,I work in industry,Q5_2,20,Supervised feature selection,NA
+R_2yl8rFix7oPCkZD,I have used tidymodels packages a few times,I work in industry,Q5_3,0,Probability calibration (post modeling),NA
+R_2yl8rFix7oPCkZD,I have used tidymodels packages a few times,I work in industry,Q5_4,0,Probability threshold optimization,NA
+R_2yl8rFix7oPCkZD,I have used tidymodels packages a few times,I work in industry,Q5_5,0,Spatial analysis models and methods,NA
+R_2yl8rFix7oPCkZD,I have used tidymodels packages a few times,I work in industry,Q5_6,0,Better serialization tools ,NA
+R_2yl8rFix7oPCkZD,I have used tidymodels packages a few times,I work in industry,Q5_10,80,H2O.ai support ,NA
+R_2yl8rFix7oPCkZD,I have used tidymodels packages a few times,I work in industry,Q5_12,0,Other,NA
+R_XBe98VqtSgW1xCx,I have used tidymodels packages many times,I work in industry,Q5_1,0,Model fairness analysis and metrics,NA
+R_XBe98VqtSgW1xCx,I have used tidymodels packages many times,I work in industry,Q5_2,25,Supervised feature selection,NA
+R_XBe98VqtSgW1xCx,I have used tidymodels packages many times,I work in industry,Q5_3,50,Probability calibration (post modeling),NA
+R_XBe98VqtSgW1xCx,I have used tidymodels packages many times,I work in industry,Q5_4,10,Probability threshold optimization,NA
+R_XBe98VqtSgW1xCx,I have used tidymodels packages many times,I work in industry,Q5_5,0,Spatial analysis models and methods,NA
+R_XBe98VqtSgW1xCx,I have used tidymodels packages many times,I work in industry,Q5_6,0,Better serialization tools ,NA
+R_XBe98VqtSgW1xCx,I have used tidymodels packages many times,I work in industry,Q5_10,0,H2O.ai support ,NA
+R_XBe98VqtSgW1xCx,I have used tidymodels packages many times,I work in industry,Q5_12,15,Other,LGBM Integration
+R_sM9rR6Nt78DCtHj,I have used tidymodels packages many times,I work in industry,Q5_1,0,Model fairness analysis and metrics,NA
+R_sM9rR6Nt78DCtHj,I have used tidymodels packages many times,I work in industry,Q5_2,30,Supervised feature selection,NA
+R_sM9rR6Nt78DCtHj,I have used tidymodels packages many times,I work in industry,Q5_3,50,Probability calibration (post modeling),NA
+R_sM9rR6Nt78DCtHj,I have used tidymodels packages many times,I work in industry,Q5_4,0,Probability threshold optimization,NA
+R_sM9rR6Nt78DCtHj,I have used tidymodels packages many times,I work in industry,Q5_5,0,Spatial analysis models and methods,NA
+R_sM9rR6Nt78DCtHj,I have used tidymodels packages many times,I work in industry,Q5_6,20,Better serialization tools ,NA
+R_sM9rR6Nt78DCtHj,I have used tidymodels packages many times,I work in industry,Q5_10,0,H2O.ai support ,NA
+R_sM9rR6Nt78DCtHj,I have used tidymodels packages many times,I work in industry,Q5_12,0,Other,NA
+R_1cVa2xhFhtAcU9B,I have never used tidymodels,"I am an academic, professor, and/or researcher",Q5_1,10,Model fairness analysis and metrics,NA
+R_1cVa2xhFhtAcU9B,I have never used tidymodels,"I am an academic, professor, and/or researcher",Q5_2,20,Supervised feature selection,NA
+R_1cVa2xhFhtAcU9B,I have never used tidymodels,"I am an academic, professor, and/or researcher",Q5_3,20,Probability calibration (post modeling),NA
+R_1cVa2xhFhtAcU9B,I have never used tidymodels,"I am an academic, professor, and/or researcher",Q5_4,20,Probability threshold optimization,NA
+R_1cVa2xhFhtAcU9B,I have never used tidymodels,"I am an academic, professor, and/or researcher",Q5_5,20,Spatial analysis models and methods,NA
+R_1cVa2xhFhtAcU9B,I have never used tidymodels,"I am an academic, professor, and/or researcher",Q5_6,0,Better serialization tools ,NA
+R_1cVa2xhFhtAcU9B,I have never used tidymodels,"I am an academic, professor, and/or researcher",Q5_10,10,H2O.ai support ,NA
+R_1cVa2xhFhtAcU9B,I have never used tidymodels,"I am an academic, professor, and/or researcher",Q5_12,0,Other,NA
+R_ZJo48UeZNMr75Sh,I have used tidymodels packages a few times,I am a student,Q5_1,10,Model fairness analysis and metrics,NA
+R_ZJo48UeZNMr75Sh,I have used tidymodels packages a few times,I am a student,Q5_2,5,Supervised feature selection,NA
+R_ZJo48UeZNMr75Sh,I have used tidymodels packages a few times,I am a student,Q5_3,30,Probability calibration (post modeling),NA
+R_ZJo48UeZNMr75Sh,I have used tidymodels packages a few times,I am a student,Q5_4,20,Probability threshold optimization,NA
+R_ZJo48UeZNMr75Sh,I have used tidymodels packages a few times,I am a student,Q5_5,20,Spatial analysis models and methods,NA
+R_ZJo48UeZNMr75Sh,I have used tidymodels packages a few times,I am a student,Q5_6,15,Better serialization tools ,NA
+R_ZJo48UeZNMr75Sh,I have used tidymodels packages a few times,I am a student,Q5_10,0,H2O.ai support ,NA
+R_ZJo48UeZNMr75Sh,I have used tidymodels packages a few times,I am a student,Q5_12,0,Other,NA
+R_25TQd2lyKfDoRrO,I have used tidymodels packages a few times,I work in industry,Q5_1,15,Model fairness analysis and metrics,NA
+R_25TQd2lyKfDoRrO,I have used tidymodels packages a few times,I work in industry,Q5_2,5,Supervised feature selection,NA
+R_25TQd2lyKfDoRrO,I have used tidymodels packages a few times,I work in industry,Q5_3,30,Probability calibration (post modeling),NA
+R_25TQd2lyKfDoRrO,I have used tidymodels packages a few times,I work in industry,Q5_4,30,Probability threshold optimization,NA
+R_25TQd2lyKfDoRrO,I have used tidymodels packages a few times,I work in industry,Q5_5,15,Spatial analysis models and methods,NA
+R_25TQd2lyKfDoRrO,I have used tidymodels packages a few times,I work in industry,Q5_6,5,Better serialization tools ,NA
+R_25TQd2lyKfDoRrO,I have used tidymodels packages a few times,I work in industry,Q5_10,0,H2O.ai support ,NA
+R_25TQd2lyKfDoRrO,I have used tidymodels packages a few times,I work in industry,Q5_12,0,Other,NA
+R_2dHkm5wLAlxLoCD,I have used tidymodels packages many times,I work in industry,Q5_1,20,Model fairness analysis and metrics,NA
+R_2dHkm5wLAlxLoCD,I have used tidymodels packages many times,I work in industry,Q5_2,30,Supervised feature selection,NA
+R_2dHkm5wLAlxLoCD,I have used tidymodels packages many times,I work in industry,Q5_3,15,Probability calibration (post modeling),NA
+R_2dHkm5wLAlxLoCD,I have used tidymodels packages many times,I work in industry,Q5_4,5,Probability threshold optimization,NA
+R_2dHkm5wLAlxLoCD,I have used tidymodels packages many times,I work in industry,Q5_5,5,Spatial analysis models and methods,NA
+R_2dHkm5wLAlxLoCD,I have used tidymodels packages many times,I work in industry,Q5_6,10,Better serialization tools ,NA
+R_2dHkm5wLAlxLoCD,I have used tidymodels packages many times,I work in industry,Q5_10,15,H2O.ai support ,NA
+R_2dHkm5wLAlxLoCD,I have used tidymodels packages many times,I work in industry,Q5_12,0,Other,NA
+R_1Nm2nRw6BP03BLy,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_1,30,Model fairness analysis and metrics,NA
+R_1Nm2nRw6BP03BLy,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_2,0,Supervised feature selection,NA
+R_1Nm2nRw6BP03BLy,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_3,10,Probability calibration (post modeling),NA
+R_1Nm2nRw6BP03BLy,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_4,15,Probability threshold optimization,NA
+R_1Nm2nRw6BP03BLy,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_5,40,Spatial analysis models and methods,NA
+R_1Nm2nRw6BP03BLy,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_6,5,Better serialization tools ,NA
+R_1Nm2nRw6BP03BLy,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_10,0,H2O.ai support ,NA
+R_1Nm2nRw6BP03BLy,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_12,0,Other,NA
+R_1DOyTEPegC416WI,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_1,50,Model fairness analysis and metrics,NA
+R_1DOyTEPegC416WI,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_2,20,Supervised feature selection,NA
+R_1DOyTEPegC416WI,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_3,0,Probability calibration (post modeling),NA
+R_1DOyTEPegC416WI,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_4,10,Probability threshold optimization,NA
+R_1DOyTEPegC416WI,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_5,20,Spatial analysis models and methods,NA
+R_1DOyTEPegC416WI,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_6,0,Better serialization tools ,NA
+R_1DOyTEPegC416WI,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_10,0,H2O.ai support ,NA
+R_1DOyTEPegC416WI,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_12,0,Other,NA
+R_6QzJWmw10lXLHI5,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_1,0,Model fairness analysis and metrics,NA
+R_6QzJWmw10lXLHI5,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_2,0,Supervised feature selection,NA
+R_6QzJWmw10lXLHI5,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_3,0,Probability calibration (post modeling),NA
+R_6QzJWmw10lXLHI5,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_4,0,Probability threshold optimization,NA
+R_6QzJWmw10lXLHI5,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_5,50,Spatial analysis models and methods,NA
+R_6QzJWmw10lXLHI5,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_6,0,Better serialization tools ,NA
+R_6QzJWmw10lXLHI5,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_10,50,H2O.ai support ,NA
+R_6QzJWmw10lXLHI5,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_12,0,Other,NA
+R_1dMRDoRy0h9CYZR,I have never used tidymodels,"I am an academic, professor, and/or researcher",Q5_1,0,Model fairness analysis and metrics,NA
+R_1dMRDoRy0h9CYZR,I have never used tidymodels,"I am an academic, professor, and/or researcher",Q5_2,25,Supervised feature selection,NA
+R_1dMRDoRy0h9CYZR,I have never used tidymodels,"I am an academic, professor, and/or researcher",Q5_3,25,Probability calibration (post modeling),NA
+R_1dMRDoRy0h9CYZR,I have never used tidymodels,"I am an academic, professor, and/or researcher",Q5_4,25,Probability threshold optimization,NA
+R_1dMRDoRy0h9CYZR,I have never used tidymodels,"I am an academic, professor, and/or researcher",Q5_5,25,Spatial analysis models and methods,NA
+R_1dMRDoRy0h9CYZR,I have never used tidymodels,"I am an academic, professor, and/or researcher",Q5_6,0,Better serialization tools ,NA
+R_1dMRDoRy0h9CYZR,I have never used tidymodels,"I am an academic, professor, and/or researcher",Q5_10,0,H2O.ai support ,NA
+R_1dMRDoRy0h9CYZR,I have never used tidymodels,"I am an academic, professor, and/or researcher",Q5_12,0,Other,NA
+R_1pEzOcPrdkjFzoi,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_1,0,Model fairness analysis and metrics,NA
+R_1pEzOcPrdkjFzoi,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_2,10,Supervised feature selection,NA
+R_1pEzOcPrdkjFzoi,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_3,0,Probability calibration (post modeling),NA
+R_1pEzOcPrdkjFzoi,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_4,0,Probability threshold optimization,NA
+R_1pEzOcPrdkjFzoi,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_5,90,Spatial analysis models and methods,NA
+R_1pEzOcPrdkjFzoi,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_6,0,Better serialization tools ,NA
+R_1pEzOcPrdkjFzoi,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_10,0,H2O.ai support ,NA
+R_1pEzOcPrdkjFzoi,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_12,0,Other,NA
+R_24jXzXoH3Bm4gi9,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_1,25,Model fairness analysis and metrics,NA
+R_24jXzXoH3Bm4gi9,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_2,25,Supervised feature selection,NA
+R_24jXzXoH3Bm4gi9,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_3,7,Probability calibration (post modeling),NA
+R_24jXzXoH3Bm4gi9,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_4,10,Probability threshold optimization,NA
+R_24jXzXoH3Bm4gi9,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_5,0,Spatial analysis models and methods,NA
+R_24jXzXoH3Bm4gi9,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_6,0,Better serialization tools ,NA
+R_24jXzXoH3Bm4gi9,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_10,33,H2O.ai support ,NA
+R_24jXzXoH3Bm4gi9,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_12,0,Other,NA
+R_UVDG8AwJquGUOzf,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_1,15,Model fairness analysis and metrics,NA
+R_UVDG8AwJquGUOzf,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_2,45,Supervised feature selection,NA
+R_UVDG8AwJquGUOzf,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_3,15,Probability calibration (post modeling),NA
+R_UVDG8AwJquGUOzf,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_4,0,Probability threshold optimization,NA
+R_UVDG8AwJquGUOzf,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_5,0,Spatial analysis models and methods,NA
+R_UVDG8AwJquGUOzf,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_6,10,Better serialization tools ,NA
+R_UVDG8AwJquGUOzf,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_10,15,H2O.ai support ,NA
+R_UVDG8AwJquGUOzf,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_12,0,Other,NA
+R_3D0muRNFbfZXsId,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_1,90,Model fairness analysis and metrics,NA
+R_3D0muRNFbfZXsId,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_2,0,Supervised feature selection,NA
+R_3D0muRNFbfZXsId,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_3,0,Probability calibration (post modeling),NA
+R_3D0muRNFbfZXsId,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_4,0,Probability threshold optimization,NA
+R_3D0muRNFbfZXsId,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_5,10,Spatial analysis models and methods,NA
+R_3D0muRNFbfZXsId,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_6,0,Better serialization tools ,NA
+R_3D0muRNFbfZXsId,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_10,0,H2O.ai support ,NA
+R_3D0muRNFbfZXsId,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_12,0,Other,NA
+R_20TMcZMYo2qdi2s,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_1,0,Model fairness analysis and metrics,NA
+R_20TMcZMYo2qdi2s,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_2,30,Supervised feature selection,NA
+R_20TMcZMYo2qdi2s,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_3,0,Probability calibration (post modeling),NA
+R_20TMcZMYo2qdi2s,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_4,0,Probability threshold optimization,NA
+R_20TMcZMYo2qdi2s,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_5,0,Spatial analysis models and methods,NA
+R_20TMcZMYo2qdi2s,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_6,70,Better serialization tools ,NA
+R_20TMcZMYo2qdi2s,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_10,0,H2O.ai support ,NA
+R_20TMcZMYo2qdi2s,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_12,0,Other,NA
+R_3JFbK5DiyUnQctg,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_1,0,Model fairness analysis and metrics,NA
+R_3JFbK5DiyUnQctg,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_2,20,Supervised feature selection,NA
+R_3JFbK5DiyUnQctg,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_3,20,Probability calibration (post modeling),NA
+R_3JFbK5DiyUnQctg,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_4,10,Probability threshold optimization,NA
+R_3JFbK5DiyUnQctg,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_5,5,Spatial analysis models and methods,NA
+R_3JFbK5DiyUnQctg,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_6,35,Better serialization tools ,NA
+R_3JFbK5DiyUnQctg,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_10,10,H2O.ai support ,NA
+R_3JFbK5DiyUnQctg,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_12,0,Other,NA
+R_1FIGz1uDPajz1TM,I have used tidymodels packages a few times,I work in industry,Q5_1,0,Model fairness analysis and metrics,NA
+R_1FIGz1uDPajz1TM,I have used tidymodels packages a few times,I work in industry,Q5_2,0,Supervised feature selection,NA
+R_1FIGz1uDPajz1TM,I have used tidymodels packages a few times,I work in industry,Q5_3,10,Probability calibration (post modeling),NA
+R_1FIGz1uDPajz1TM,I have used tidymodels packages a few times,I work in industry,Q5_4,0,Probability threshold optimization,NA
+R_1FIGz1uDPajz1TM,I have used tidymodels packages a few times,I work in industry,Q5_5,10,Spatial analysis models and methods,NA
+R_1FIGz1uDPajz1TM,I have used tidymodels packages a few times,I work in industry,Q5_6,15,Better serialization tools ,NA
+R_1FIGz1uDPajz1TM,I have used tidymodels packages a few times,I work in industry,Q5_10,60,H2O.ai support ,NA
+R_1FIGz1uDPajz1TM,I have used tidymodels packages a few times,I work in industry,Q5_12,5,Other,INLA
+R_2TTWmoVJVRI2oZI,I have used tidymodels packages many times,I work in industry,Q5_1,0,Model fairness analysis and metrics,NA
+R_2TTWmoVJVRI2oZI,I have used tidymodels packages many times,I work in industry,Q5_2,0,Supervised feature selection,NA
+R_2TTWmoVJVRI2oZI,I have used tidymodels packages many times,I work in industry,Q5_3,10,Probability calibration (post modeling),NA
+R_2TTWmoVJVRI2oZI,I have used tidymodels packages many times,I work in industry,Q5_4,10,Probability threshold optimization,NA
+R_2TTWmoVJVRI2oZI,I have used tidymodels packages many times,I work in industry,Q5_5,0,Spatial analysis models and methods,NA
+R_2TTWmoVJVRI2oZI,I have used tidymodels packages many times,I work in industry,Q5_6,50,Better serialization tools ,NA
+R_2TTWmoVJVRI2oZI,I have used tidymodels packages many times,I work in industry,Q5_10,20,H2O.ai support ,NA
+R_2TTWmoVJVRI2oZI,I have used tidymodels packages many times,I work in industry,Q5_12,10,Other,Bayesian models
+R_3ixL934z1Houaxt,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_1,0,Model fairness analysis and metrics,NA
+R_3ixL934z1Houaxt,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_2,0,Supervised feature selection,NA
+R_3ixL934z1Houaxt,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_3,90,Probability calibration (post modeling),NA
+R_3ixL934z1Houaxt,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_4,0,Probability threshold optimization,NA
+R_3ixL934z1Houaxt,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_5,0,Spatial analysis models and methods,NA
+R_3ixL934z1Houaxt,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_6,0,Better serialization tools ,NA
+R_3ixL934z1Houaxt,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_10,0,H2O.ai support ,NA
+R_3ixL934z1Houaxt,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_12,10,Other,LSMeans and pairs (I think this counts as post modeling tho)
+R_1hDWHFizon6zW1J,I have used tidymodels packages a few times,I work in industry,Q5_1,20,Model fairness analysis and metrics,NA
+R_1hDWHFizon6zW1J,I have used tidymodels packages a few times,I work in industry,Q5_2,20,Supervised feature selection,NA
+R_1hDWHFizon6zW1J,I have used tidymodels packages a few times,I work in industry,Q5_3,30,Probability calibration (post modeling),NA
+R_1hDWHFizon6zW1J,I have used tidymodels packages a few times,I work in industry,Q5_4,0,Probability threshold optimization,NA
+R_1hDWHFizon6zW1J,I have used tidymodels packages a few times,I work in industry,Q5_5,0,Spatial analysis models and methods,NA
+R_1hDWHFizon6zW1J,I have used tidymodels packages a few times,I work in industry,Q5_6,30,Better serialization tools ,NA
+R_1hDWHFizon6zW1J,I have used tidymodels packages a few times,I work in industry,Q5_10,0,H2O.ai support ,NA
+R_1hDWHFizon6zW1J,I have used tidymodels packages a few times,I work in industry,Q5_12,0,Other,NA
+R_3GrkxYtkjbxuVDQ,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_1,20,Model fairness analysis and metrics,NA
+R_3GrkxYtkjbxuVDQ,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_2,40,Supervised feature selection,NA
+R_3GrkxYtkjbxuVDQ,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_3,10,Probability calibration (post modeling),NA
+R_3GrkxYtkjbxuVDQ,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_4,0,Probability threshold optimization,NA
+R_3GrkxYtkjbxuVDQ,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_5,0,Spatial analysis models and methods,NA
+R_3GrkxYtkjbxuVDQ,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_6,30,Better serialization tools ,NA
+R_3GrkxYtkjbxuVDQ,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_10,0,H2O.ai support ,NA
+R_3GrkxYtkjbxuVDQ,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_12,0,Other,NA
+R_2CkYlRiObMFig41,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_1,20,Model fairness analysis and metrics,NA
+R_2CkYlRiObMFig41,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_2,10,Supervised feature selection,NA
+R_2CkYlRiObMFig41,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_3,20,Probability calibration (post modeling),NA
+R_2CkYlRiObMFig41,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_4,0,Probability threshold optimization,NA
+R_2CkYlRiObMFig41,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_5,50,Spatial analysis models and methods,NA
+R_2CkYlRiObMFig41,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_6,0,Better serialization tools ,NA
+R_2CkYlRiObMFig41,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_10,0,H2O.ai support ,NA
+R_2CkYlRiObMFig41,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_12,0,Other,NA
+R_2dMuWIFgMVBs2dV,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_1,0,Model fairness analysis and metrics,NA
+R_2dMuWIFgMVBs2dV,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_2,40,Supervised feature selection,NA
+R_2dMuWIFgMVBs2dV,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_3,10,Probability calibration (post modeling),NA
+R_2dMuWIFgMVBs2dV,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_4,20,Probability threshold optimization,NA
+R_2dMuWIFgMVBs2dV,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_5,20,Spatial analysis models and methods,NA
+R_2dMuWIFgMVBs2dV,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_6,10,Better serialization tools ,NA
+R_2dMuWIFgMVBs2dV,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_10,0,H2O.ai support ,NA
+R_2dMuWIFgMVBs2dV,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_12,0,Other,NA
+R_egR49ltaiyTw92x,I have used tidymodels packages many times,I work in industry,Q5_1,10,Model fairness analysis and metrics,NA
+R_egR49ltaiyTw92x,I have used tidymodels packages many times,I work in industry,Q5_2,70,Supervised feature selection,NA
+R_egR49ltaiyTw92x,I have used tidymodels packages many times,I work in industry,Q5_3,10,Probability calibration (post modeling),NA
+R_egR49ltaiyTw92x,I have used tidymodels packages many times,I work in industry,Q5_4,10,Probability threshold optimization,NA
+R_egR49ltaiyTw92x,I have used tidymodels packages many times,I work in industry,Q5_5,0,Spatial analysis models and methods,NA
+R_egR49ltaiyTw92x,I have used tidymodels packages many times,I work in industry,Q5_6,0,Better serialization tools ,NA
+R_egR49ltaiyTw92x,I have used tidymodels packages many times,I work in industry,Q5_10,0,H2O.ai support ,NA
+R_egR49ltaiyTw92x,I have used tidymodels packages many times,I work in industry,Q5_12,0,Other,NA
+R_vBH5uctUWiXJfQl,I have used tidymodels packages many times,I work in industry,Q5_1,0,Model fairness analysis and metrics,NA
+R_vBH5uctUWiXJfQl,I have used tidymodels packages many times,I work in industry,Q5_2,20,Supervised feature selection,NA
+R_vBH5uctUWiXJfQl,I have used tidymodels packages many times,I work in industry,Q5_3,20,Probability calibration (post modeling),NA
+R_vBH5uctUWiXJfQl,I have used tidymodels packages many times,I work in industry,Q5_4,10,Probability threshold optimization,NA
+R_vBH5uctUWiXJfQl,I have used tidymodels packages many times,I work in industry,Q5_5,0,Spatial analysis models and methods,NA
+R_vBH5uctUWiXJfQl,I have used tidymodels packages many times,I work in industry,Q5_6,0,Better serialization tools ,NA
+R_vBH5uctUWiXJfQl,I have used tidymodels packages many times,I work in industry,Q5_10,0,H2O.ai support ,NA
+R_vBH5uctUWiXJfQl,I have used tidymodels packages many times,I work in industry,Q5_12,50,Other,Better incorporation of survival models
+R_3Poga6ZEo5T4MSa,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_1,70,Model fairness analysis and metrics,NA
+R_3Poga6ZEo5T4MSa,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_2,0,Supervised feature selection,NA
+R_3Poga6ZEo5T4MSa,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_3,0,Probability calibration (post modeling),NA
+R_3Poga6ZEo5T4MSa,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_4,0,Probability threshold optimization,NA
+R_3Poga6ZEo5T4MSa,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_5,0,Spatial analysis models and methods,NA
+R_3Poga6ZEo5T4MSa,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_6,30,Better serialization tools ,NA
+R_3Poga6ZEo5T4MSa,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_10,0,H2O.ai support ,NA
+R_3Poga6ZEo5T4MSa,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_12,0,Other,NA
+R_5sxcDLl4pd7iyqt,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_1,5,Model fairness analysis and metrics,NA
+R_5sxcDLl4pd7iyqt,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_2,5,Supervised feature selection,NA
+R_5sxcDLl4pd7iyqt,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_3,5,Probability calibration (post modeling),NA
+R_5sxcDLl4pd7iyqt,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_4,0,Probability threshold optimization,NA
+R_5sxcDLl4pd7iyqt,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_5,30,Spatial analysis models and methods,NA
+R_5sxcDLl4pd7iyqt,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_6,0,Better serialization tools ,NA
+R_5sxcDLl4pd7iyqt,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_10,30,H2O.ai support ,NA
+R_5sxcDLl4pd7iyqt,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_12,25,Other,Model interpretability
+R_2c2A4mS2N1wZhxR,I have used tidymodels packages a few times,I work in industry,Q5_1,25,Model fairness analysis and metrics,NA
+R_2c2A4mS2N1wZhxR,I have used tidymodels packages a few times,I work in industry,Q5_2,15,Supervised feature selection,NA
+R_2c2A4mS2N1wZhxR,I have used tidymodels packages a few times,I work in industry,Q5_3,10,Probability calibration (post modeling),NA
+R_2c2A4mS2N1wZhxR,I have used tidymodels packages a few times,I work in industry,Q5_4,15,Probability threshold optimization,NA
+R_2c2A4mS2N1wZhxR,I have used tidymodels packages a few times,I work in industry,Q5_5,15,Spatial analysis models and methods,NA
+R_2c2A4mS2N1wZhxR,I have used tidymodels packages a few times,I work in industry,Q5_6,20,Better serialization tools ,NA
+R_2c2A4mS2N1wZhxR,I have used tidymodels packages a few times,I work in industry,Q5_10,0,H2O.ai support ,NA
+R_2c2A4mS2N1wZhxR,I have used tidymodels packages a few times,I work in industry,Q5_12,0,Other,NA
+R_3MtYtNkuKRV52ck,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_1,40,Model fairness analysis and metrics,NA
+R_3MtYtNkuKRV52ck,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_2,0,Supervised feature selection,NA
+R_3MtYtNkuKRV52ck,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_3,10,Probability calibration (post modeling),NA
+R_3MtYtNkuKRV52ck,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_4,20,Probability threshold optimization,NA
+R_3MtYtNkuKRV52ck,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_5,0,Spatial analysis models and methods,NA
+R_3MtYtNkuKRV52ck,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_6,20,Better serialization tools ,NA
+R_3MtYtNkuKRV52ck,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_10,10,H2O.ai support ,NA
+R_3MtYtNkuKRV52ck,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_12,0,Other,NA
+R_QiviDmRWwAaHx4J,I have used tidymodels packages many times,I am a student,Q5_1,50,Model fairness analysis and metrics,NA
+R_QiviDmRWwAaHx4J,I have used tidymodels packages many times,I am a student,Q5_2,0,Supervised feature selection,NA
+R_QiviDmRWwAaHx4J,I have used tidymodels packages many times,I am a student,Q5_3,0,Probability calibration (post modeling),NA
+R_QiviDmRWwAaHx4J,I have used tidymodels packages many times,I am a student,Q5_4,25,Probability threshold optimization,NA
+R_QiviDmRWwAaHx4J,I have used tidymodels packages many times,I am a student,Q5_5,0,Spatial analysis models and methods,NA
+R_QiviDmRWwAaHx4J,I have used tidymodels packages many times,I am a student,Q5_6,25,Better serialization tools ,NA
+R_QiviDmRWwAaHx4J,I have used tidymodels packages many times,I am a student,Q5_10,0,H2O.ai support ,NA
+R_QiviDmRWwAaHx4J,I have used tidymodels packages many times,I am a student,Q5_12,0,Other,NA
+R_3qlF7Dy81XPleav,I have used tidymodels packages many times,I work in industry,Q5_1,10,Model fairness analysis and metrics,NA
+R_3qlF7Dy81XPleav,I have used tidymodels packages many times,I work in industry,Q5_2,10,Supervised feature selection,NA
+R_3qlF7Dy81XPleav,I have used tidymodels packages many times,I work in industry,Q5_3,40,Probability calibration (post modeling),NA
+R_3qlF7Dy81XPleav,I have used tidymodels packages many times,I work in industry,Q5_4,0,Probability threshold optimization,NA
+R_3qlF7Dy81XPleav,I have used tidymodels packages many times,I work in industry,Q5_5,0,Spatial analysis models and methods,NA
+R_3qlF7Dy81XPleav,I have used tidymodels packages many times,I work in industry,Q5_6,10,Better serialization tools ,NA
+R_3qlF7Dy81XPleav,I have used tidymodels packages many times,I work in industry,Q5_10,30,H2O.ai support ,NA
+R_3qlF7Dy81XPleav,I have used tidymodels packages many times,I work in industry,Q5_12,0,Other,NA
+R_3qe3RotoZssGdIe,I have used tidymodels packages a few times,I work in industry,Q5_1,0,Model fairness analysis and metrics,NA
+R_3qe3RotoZssGdIe,I have used tidymodels packages a few times,I work in industry,Q5_2,30,Supervised feature selection,NA
+R_3qe3RotoZssGdIe,I have used tidymodels packages a few times,I work in industry,Q5_3,30,Probability calibration (post modeling),NA
+R_3qe3RotoZssGdIe,I have used tidymodels packages a few times,I work in industry,Q5_4,0,Probability threshold optimization,NA
+R_3qe3RotoZssGdIe,I have used tidymodels packages a few times,I work in industry,Q5_5,40,Spatial analysis models and methods,NA
+R_3qe3RotoZssGdIe,I have used tidymodels packages a few times,I work in industry,Q5_6,0,Better serialization tools ,NA
+R_3qe3RotoZssGdIe,I have used tidymodels packages a few times,I work in industry,Q5_10,0,H2O.ai support ,NA
+R_3qe3RotoZssGdIe,I have used tidymodels packages a few times,I work in industry,Q5_12,0,Other,NA
+R_2dYZiEaJynuQ4Eb,I have contributed to tidymodels packages or taught others how to use them,"I am an academic, professor, and/or researcher",Q5_1,0,Model fairness analysis and metrics,NA
+R_2dYZiEaJynuQ4Eb,I have contributed to tidymodels packages or taught others how to use them,"I am an academic, professor, and/or researcher",Q5_2,0,Supervised feature selection,NA
+R_2dYZiEaJynuQ4Eb,I have contributed to tidymodels packages or taught others how to use them,"I am an academic, professor, and/or researcher",Q5_3,0,Probability calibration (post modeling),NA
+R_2dYZiEaJynuQ4Eb,I have contributed to tidymodels packages or taught others how to use them,"I am an academic, professor, and/or researcher",Q5_4,0,Probability threshold optimization,NA
+R_2dYZiEaJynuQ4Eb,I have contributed to tidymodels packages or taught others how to use them,"I am an academic, professor, and/or researcher",Q5_5,0,Spatial analysis models and methods,NA
+R_2dYZiEaJynuQ4Eb,I have contributed to tidymodels packages or taught others how to use them,"I am an academic, professor, and/or researcher",Q5_6,0,Better serialization tools ,NA
+R_2dYZiEaJynuQ4Eb,I have contributed to tidymodels packages or taught others how to use them,"I am an academic, professor, and/or researcher",Q5_10,0,H2O.ai support ,NA
+R_2dYZiEaJynuQ4Eb,I have contributed to tidymodels packages or taught others how to use them,"I am an academic, professor, and/or researcher",Q5_12,100,Other,State of the Art documentation
+R_1l4eO7kNW0xCt9k,I have used tidymodels packages a few times,I work in industry,Q5_1,10,Model fairness analysis and metrics,NA
+R_1l4eO7kNW0xCt9k,I have used tidymodels packages a few times,I work in industry,Q5_2,10,Supervised feature selection,NA
+R_1l4eO7kNW0xCt9k,I have used tidymodels packages a few times,I work in industry,Q5_3,15,Probability calibration (post modeling),NA
+R_1l4eO7kNW0xCt9k,I have used tidymodels packages a few times,I work in industry,Q5_4,40,Probability threshold optimization,NA
+R_1l4eO7kNW0xCt9k,I have used tidymodels packages a few times,I work in industry,Q5_5,0,Spatial analysis models and methods,NA
+R_1l4eO7kNW0xCt9k,I have used tidymodels packages a few times,I work in industry,Q5_6,5,Better serialization tools ,NA
+R_1l4eO7kNW0xCt9k,I have used tidymodels packages a few times,I work in industry,Q5_10,20,H2O.ai support ,NA
+R_1l4eO7kNW0xCt9k,I have used tidymodels packages a few times,I work in industry,Q5_12,0,Other,NA
+R_AgHaWZY3VFMV769,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_1,20,Model fairness analysis and metrics,NA
+R_AgHaWZY3VFMV769,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_2,0,Supervised feature selection,NA
+R_AgHaWZY3VFMV769,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_3,0,Probability calibration (post modeling),NA
+R_AgHaWZY3VFMV769,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_4,0,Probability threshold optimization,NA
+R_AgHaWZY3VFMV769,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_5,0,Spatial analysis models and methods,NA
+R_AgHaWZY3VFMV769,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_6,50,Better serialization tools ,NA
+R_AgHaWZY3VFMV769,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_10,10,H2O.ai support ,NA
+R_AgHaWZY3VFMV769,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_12,20,Other,Improve butcher
+R_265vPY3KZ9A4kh9,I have used tidymodels packages many times,I am a hobbyist,Q5_1,10,Model fairness analysis and metrics,NA
+R_265vPY3KZ9A4kh9,I have used tidymodels packages many times,I am a hobbyist,Q5_2,20,Supervised feature selection,NA
+R_265vPY3KZ9A4kh9,I have used tidymodels packages many times,I am a hobbyist,Q5_3,20,Probability calibration (post modeling),NA
+R_265vPY3KZ9A4kh9,I have used tidymodels packages many times,I am a hobbyist,Q5_4,0,Probability threshold optimization,NA
+R_265vPY3KZ9A4kh9,I have used tidymodels packages many times,I am a hobbyist,Q5_5,0,Spatial analysis models and methods,NA
+R_265vPY3KZ9A4kh9,I have used tidymodels packages many times,I am a hobbyist,Q5_6,40,Better serialization tools ,NA
+R_265vPY3KZ9A4kh9,I have used tidymodels packages many times,I am a hobbyist,Q5_10,10,H2O.ai support ,NA
+R_265vPY3KZ9A4kh9,I have used tidymodels packages many times,I am a hobbyist,Q5_12,0,Other,NA
+R_vDLYNL7FgqfdPVf,I have used tidymodels packages many times,I work in industry,Q5_1,10,Model fairness analysis and metrics,NA
+R_vDLYNL7FgqfdPVf,I have used tidymodels packages many times,I work in industry,Q5_2,20,Supervised feature selection,NA
+R_vDLYNL7FgqfdPVf,I have used tidymodels packages many times,I work in industry,Q5_3,0,Probability calibration (post modeling),NA
+R_vDLYNL7FgqfdPVf,I have used tidymodels packages many times,I work in industry,Q5_4,0,Probability threshold optimization,NA
+R_vDLYNL7FgqfdPVf,I have used tidymodels packages many times,I work in industry,Q5_5,20,Spatial analysis models and methods,NA
+R_vDLYNL7FgqfdPVf,I have used tidymodels packages many times,I work in industry,Q5_6,40,Better serialization tools ,NA
+R_vDLYNL7FgqfdPVf,I have used tidymodels packages many times,I work in industry,Q5_10,10,H2O.ai support ,NA
+R_vDLYNL7FgqfdPVf,I have used tidymodels packages many times,I work in industry,Q5_12,0,Other,NA
+R_3NPB7UvmpbDRJz2,I have used tidymodels packages a few times,I work in industry,Q5_1,25,Model fairness analysis and metrics,NA
+R_3NPB7UvmpbDRJz2,I have used tidymodels packages a few times,I work in industry,Q5_2,50,Supervised feature selection,NA
+R_3NPB7UvmpbDRJz2,I have used tidymodels packages a few times,I work in industry,Q5_3,25,Probability calibration (post modeling),NA
+R_3NPB7UvmpbDRJz2,I have used tidymodels packages a few times,I work in industry,Q5_4,0,Probability threshold optimization,NA
+R_3NPB7UvmpbDRJz2,I have used tidymodels packages a few times,I work in industry,Q5_5,0,Spatial analysis models and methods,NA
+R_3NPB7UvmpbDRJz2,I have used tidymodels packages a few times,I work in industry,Q5_6,0,Better serialization tools ,NA
+R_3NPB7UvmpbDRJz2,I have used tidymodels packages a few times,I work in industry,Q5_10,0,H2O.ai support ,NA
+R_3NPB7UvmpbDRJz2,I have used tidymodels packages a few times,I work in industry,Q5_12,0,Other,NA
+R_2TnqF99jf6gCBcc,I have used tidymodels packages a few times,I work in industry,Q5_1,25,Model fairness analysis and metrics,NA
+R_2TnqF99jf6gCBcc,I have used tidymodels packages a few times,I work in industry,Q5_2,0,Supervised feature selection,NA
+R_2TnqF99jf6gCBcc,I have used tidymodels packages a few times,I work in industry,Q5_3,25,Probability calibration (post modeling),NA
+R_2TnqF99jf6gCBcc,I have used tidymodels packages a few times,I work in industry,Q5_4,25,Probability threshold optimization,NA
+R_2TnqF99jf6gCBcc,I have used tidymodels packages a few times,I work in industry,Q5_5,0,Spatial analysis models and methods,NA
+R_2TnqF99jf6gCBcc,I have used tidymodels packages a few times,I work in industry,Q5_6,0,Better serialization tools ,NA
+R_2TnqF99jf6gCBcc,I have used tidymodels packages a few times,I work in industry,Q5_10,0,H2O.ai support ,NA
+R_2TnqF99jf6gCBcc,I have used tidymodels packages a few times,I work in industry,Q5_12,25,Other,Easier access to both training and test set metrics to assess overfitting
+R_2c6JiL5D1fRE6Wv,I have used tidymodels packages a few times,I work in industry,Q5_1,30,Model fairness analysis and metrics,NA
+R_2c6JiL5D1fRE6Wv,I have used tidymodels packages a few times,I work in industry,Q5_2,20,Supervised feature selection,NA
+R_2c6JiL5D1fRE6Wv,I have used tidymodels packages a few times,I work in industry,Q5_3,0,Probability calibration (post modeling),NA
+R_2c6JiL5D1fRE6Wv,I have used tidymodels packages a few times,I work in industry,Q5_4,0,Probability threshold optimization,NA
+R_2c6JiL5D1fRE6Wv,I have used tidymodels packages a few times,I work in industry,Q5_5,40,Spatial analysis models and methods,NA
+R_2c6JiL5D1fRE6Wv,I have used tidymodels packages a few times,I work in industry,Q5_6,10,Better serialization tools ,NA
+R_2c6JiL5D1fRE6Wv,I have used tidymodels packages a few times,I work in industry,Q5_10,0,H2O.ai support ,NA
+R_2c6JiL5D1fRE6Wv,I have used tidymodels packages a few times,I work in industry,Q5_12,0,Other,NA
+R_6ulDlLmA7dRiPw5,I have used tidymodels packages a few times,I work in industry,Q5_1,10,Model fairness analysis and metrics,NA
+R_6ulDlLmA7dRiPw5,I have used tidymodels packages a few times,I work in industry,Q5_2,25,Supervised feature selection,NA
+R_6ulDlLmA7dRiPw5,I have used tidymodels packages a few times,I work in industry,Q5_3,15,Probability calibration (post modeling),NA
+R_6ulDlLmA7dRiPw5,I have used tidymodels packages a few times,I work in industry,Q5_4,50,Probability threshold optimization,NA
+R_6ulDlLmA7dRiPw5,I have used tidymodels packages a few times,I work in industry,Q5_5,0,Spatial analysis models and methods,NA
+R_6ulDlLmA7dRiPw5,I have used tidymodels packages a few times,I work in industry,Q5_6,0,Better serialization tools ,NA
+R_6ulDlLmA7dRiPw5,I have used tidymodels packages a few times,I work in industry,Q5_10,0,H2O.ai support ,NA
+R_6ulDlLmA7dRiPw5,I have used tidymodels packages a few times,I work in industry,Q5_12,0,Other,NA
+R_5dNxTSR9zWIfGiB,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_1,10,Model fairness analysis and metrics,NA
+R_5dNxTSR9zWIfGiB,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_2,15,Supervised feature selection,NA
+R_5dNxTSR9zWIfGiB,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_3,20,Probability calibration (post modeling),NA
+R_5dNxTSR9zWIfGiB,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_4,0,Probability threshold optimization,NA
+R_5dNxTSR9zWIfGiB,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_5,0,Spatial analysis models and methods,NA
+R_5dNxTSR9zWIfGiB,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_6,15,Better serialization tools ,NA
+R_5dNxTSR9zWIfGiB,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_10,0,H2O.ai support ,NA
+R_5dNxTSR9zWIfGiB,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_12,40,Other,"More Bayesian inference integration (with Stan, Greta, tidybayes, etc.)"
+R_3PB7KEOVVTVxax8,I have used tidymodels packages a few times,I work in industry,Q5_1,0,Model fairness analysis and metrics,NA
+R_3PB7KEOVVTVxax8,I have used tidymodels packages a few times,I work in industry,Q5_2,20,Supervised feature selection,NA
+R_3PB7KEOVVTVxax8,I have used tidymodels packages a few times,I work in industry,Q5_3,20,Probability calibration (post modeling),NA
+R_3PB7KEOVVTVxax8,I have used tidymodels packages a few times,I work in industry,Q5_4,20,Probability threshold optimization,NA
+R_3PB7KEOVVTVxax8,I have used tidymodels packages a few times,I work in industry,Q5_5,0,Spatial analysis models and methods,NA
+R_3PB7KEOVVTVxax8,I have used tidymodels packages a few times,I work in industry,Q5_6,0,Better serialization tools ,NA
+R_3PB7KEOVVTVxax8,I have used tidymodels packages a few times,I work in industry,Q5_10,20,H2O.ai support ,NA
+R_3PB7KEOVVTVxax8,I have used tidymodels packages a few times,I work in industry,Q5_12,20,Other,Easy to use interpretability metrics and dashboard in Shiny
+R_OdQiM6KxizOiufD,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_1,20,Model fairness analysis and metrics,NA
+R_OdQiM6KxizOiufD,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_2,80,Supervised feature selection,NA
+R_OdQiM6KxizOiufD,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_3,0,Probability calibration (post modeling),NA
+R_OdQiM6KxizOiufD,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_4,0,Probability threshold optimization,NA
+R_OdQiM6KxizOiufD,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_5,0,Spatial analysis models and methods,NA
+R_OdQiM6KxizOiufD,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_6,0,Better serialization tools ,NA
+R_OdQiM6KxizOiufD,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_10,0,H2O.ai support ,NA
+R_OdQiM6KxizOiufD,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_12,0,Other,NA
+R_10r53K71EM5mydi,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_1,60,Model fairness analysis and metrics,NA
+R_10r53K71EM5mydi,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_2,0,Supervised feature selection,NA
+R_10r53K71EM5mydi,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_3,0,Probability calibration (post modeling),NA
+R_10r53K71EM5mydi,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_4,20,Probability threshold optimization,NA
+R_10r53K71EM5mydi,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_5,0,Spatial analysis models and methods,NA
+R_10r53K71EM5mydi,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_6,0,Better serialization tools ,NA
+R_10r53K71EM5mydi,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_10,20,H2O.ai support ,NA
+R_10r53K71EM5mydi,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_12,0,Other,NA
+R_AvWKM6Ta2oITAqd,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_1,1,Model fairness analysis and metrics,NA
+R_AvWKM6Ta2oITAqd,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_2,10,Supervised feature selection,NA
+R_AvWKM6Ta2oITAqd,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_3,3,Probability calibration (post modeling),NA
+R_AvWKM6Ta2oITAqd,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_4,0,Probability threshold optimization,NA
+R_AvWKM6Ta2oITAqd,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_5,1,Spatial analysis models and methods,NA
+R_AvWKM6Ta2oITAqd,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_6,0,Better serialization tools ,NA
+R_AvWKM6Ta2oITAqd,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_10,0,H2O.ai support ,NA
+R_AvWKM6Ta2oITAqd,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_12,85,Other,"Outcome pre-/post-processing (e.g. log->model->exp), Optional pre-processing as a hyperparameter, tune_bayes can automatically tries all values of trees for xgboost/LightGBM via early stopping, setting non-dials hyperparameters should cause less trouble, model offsets (e.g. Poisson GLMNET), relaxed LASSO, easier for users to bring their own models (e.g. on-the-fly neural network or non-linear brms model)"
+R_1Cx85XUmtzH9PoC,I have used tidymodels packages many times,I work in industry,Q5_1,15,Model fairness analysis and metrics,NA
+R_1Cx85XUmtzH9PoC,I have used tidymodels packages many times,I work in industry,Q5_2,15,Supervised feature selection,NA
+R_1Cx85XUmtzH9PoC,I have used tidymodels packages many times,I work in industry,Q5_3,20,Probability calibration (post modeling),NA
+R_1Cx85XUmtzH9PoC,I have used tidymodels packages many times,I work in industry,Q5_4,15,Probability threshold optimization,NA
+R_1Cx85XUmtzH9PoC,I have used tidymodels packages many times,I work in industry,Q5_5,15,Spatial analysis models and methods,NA
+R_1Cx85XUmtzH9PoC,I have used tidymodels packages many times,I work in industry,Q5_6,0,Better serialization tools ,NA
+R_1Cx85XUmtzH9PoC,I have used tidymodels packages many times,I work in industry,Q5_10,0,H2O.ai support ,NA
+R_1Cx85XUmtzH9PoC,I have used tidymodels packages many times,I work in industry,Q5_12,20,Other,Time series
+R_2Bgp5eu9ylDPz18,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_1,25,Model fairness analysis and metrics,NA
+R_2Bgp5eu9ylDPz18,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_2,0,Supervised feature selection,NA
+R_2Bgp5eu9ylDPz18,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_3,0,Probability calibration (post modeling),NA
+R_2Bgp5eu9ylDPz18,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_4,0,Probability threshold optimization,NA
+R_2Bgp5eu9ylDPz18,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_5,75,Spatial analysis models and methods,NA
+R_2Bgp5eu9ylDPz18,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_6,0,Better serialization tools ,NA
+R_2Bgp5eu9ylDPz18,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_10,0,H2O.ai support ,NA
+R_2Bgp5eu9ylDPz18,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_12,0,Other,NA
+R_2sasIfQlf6ebyhq,I have used tidymodels packages many times,I work in industry,Q5_1,20,Model fairness analysis and metrics,NA
+R_2sasIfQlf6ebyhq,I have used tidymodels packages many times,I work in industry,Q5_2,0,Supervised feature selection,NA
+R_2sasIfQlf6ebyhq,I have used tidymodels packages many times,I work in industry,Q5_3,30,Probability calibration (post modeling),NA
+R_2sasIfQlf6ebyhq,I have used tidymodels packages many times,I work in industry,Q5_4,25,Probability threshold optimization,NA
+R_2sasIfQlf6ebyhq,I have used tidymodels packages many times,I work in industry,Q5_5,15,Spatial analysis models and methods,NA
+R_2sasIfQlf6ebyhq,I have used tidymodels packages many times,I work in industry,Q5_6,10,Better serialization tools ,NA
+R_2sasIfQlf6ebyhq,I have used tidymodels packages many times,I work in industry,Q5_10,0,H2O.ai support ,NA
+R_2sasIfQlf6ebyhq,I have used tidymodels packages many times,I work in industry,Q5_12,0,Other,NA
+R_vTPvEsvQoMgJsPf,I have used tidymodels packages many times,I work in industry,Q5_1,20,Model fairness analysis and metrics,NA
+R_vTPvEsvQoMgJsPf,I have used tidymodels packages many times,I work in industry,Q5_2,0,Supervised feature selection,NA
+R_vTPvEsvQoMgJsPf,I have used tidymodels packages many times,I work in industry,Q5_3,0,Probability calibration (post modeling),NA
+R_vTPvEsvQoMgJsPf,I have used tidymodels packages many times,I work in industry,Q5_4,0,Probability threshold optimization,NA
+R_vTPvEsvQoMgJsPf,I have used tidymodels packages many times,I work in industry,Q5_5,10,Spatial analysis models and methods,NA
+R_vTPvEsvQoMgJsPf,I have used tidymodels packages many times,I work in industry,Q5_6,10,Better serialization tools ,NA
+R_vTPvEsvQoMgJsPf,I have used tidymodels packages many times,I work in industry,Q5_10,60,H2O.ai support ,NA
+R_vTPvEsvQoMgJsPf,I have used tidymodels packages many times,I work in industry,Q5_12,0,Other,NA
+R_2OIucd5YTWZQZA8,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_1,0,Model fairness analysis and metrics,NA
+R_2OIucd5YTWZQZA8,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_2,30,Supervised feature selection,NA
+R_2OIucd5YTWZQZA8,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_3,0,Probability calibration (post modeling),NA
+R_2OIucd5YTWZQZA8,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_4,5,Probability threshold optimization,NA
+R_2OIucd5YTWZQZA8,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_5,10,Spatial analysis models and methods,NA
+R_2OIucd5YTWZQZA8,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_6,5,Better serialization tools ,NA
+R_2OIucd5YTWZQZA8,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_10,0,H2O.ai support ,NA
+R_2OIucd5YTWZQZA8,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_12,50,Other,Explainability (e.g. SHAP & LIME)
+R_3el9lsQBS7hvNrV,I have used tidymodels packages many times,I am a student,Q5_1,15,Model fairness analysis and metrics,NA
+R_3el9lsQBS7hvNrV,I have used tidymodels packages many times,I am a student,Q5_2,20,Supervised feature selection,NA
+R_3el9lsQBS7hvNrV,I have used tidymodels packages many times,I am a student,Q5_3,10,Probability calibration (post modeling),NA
+R_3el9lsQBS7hvNrV,I have used tidymodels packages many times,I am a student,Q5_4,10,Probability threshold optimization,NA
+R_3el9lsQBS7hvNrV,I have used tidymodels packages many times,I am a student,Q5_5,5,Spatial analysis models and methods,NA
+R_3el9lsQBS7hvNrV,I have used tidymodels packages many times,I am a student,Q5_6,25,Better serialization tools ,NA
+R_3el9lsQBS7hvNrV,I have used tidymodels packages many times,I am a student,Q5_10,15,H2O.ai support ,NA
+R_3el9lsQBS7hvNrV,I have used tidymodels packages many times,I am a student,Q5_12,0,Other,NA
+R_2CTlHdEHbFZ9AbM,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_1,30,Model fairness analysis and metrics,NA
+R_2CTlHdEHbFZ9AbM,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_2,0,Supervised feature selection,NA
+R_2CTlHdEHbFZ9AbM,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_3,10,Probability calibration (post modeling),NA
+R_2CTlHdEHbFZ9AbM,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_4,10,Probability threshold optimization,NA
+R_2CTlHdEHbFZ9AbM,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_5,0,Spatial analysis models and methods,NA
+R_2CTlHdEHbFZ9AbM,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_6,10,Better serialization tools ,NA
+R_2CTlHdEHbFZ9AbM,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_10,10,H2O.ai support ,NA
+R_2CTlHdEHbFZ9AbM,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_12,30,Other,Causal Modeling
+R_DvgwSS83UQS4L61,I have used tidymodels packages a few times,I work in industry,Q5_1,30,Model fairness analysis and metrics,NA
+R_DvgwSS83UQS4L61,I have used tidymodels packages a few times,I work in industry,Q5_2,10,Supervised feature selection,NA
+R_DvgwSS83UQS4L61,I have used tidymodels packages a few times,I work in industry,Q5_3,30,Probability calibration (post modeling),NA
+R_DvgwSS83UQS4L61,I have used tidymodels packages a few times,I work in industry,Q5_4,0,Probability threshold optimization,NA
+R_DvgwSS83UQS4L61,I have used tidymodels packages a few times,I work in industry,Q5_5,30,Spatial analysis models and methods,NA
+R_DvgwSS83UQS4L61,I have used tidymodels packages a few times,I work in industry,Q5_6,0,Better serialization tools ,NA
+R_DvgwSS83UQS4L61,I have used tidymodels packages a few times,I work in industry,Q5_10,0,H2O.ai support ,NA
+R_DvgwSS83UQS4L61,I have used tidymodels packages a few times,I work in industry,Q5_12,0,Other,NA
+R_3gShIjot3ViY3Z1,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_1,10,Model fairness analysis and metrics,NA
+R_3gShIjot3ViY3Z1,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_2,50,Supervised feature selection,NA
+R_3gShIjot3ViY3Z1,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_3,0,Probability calibration (post modeling),NA
+R_3gShIjot3ViY3Z1,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_4,0,Probability threshold optimization,NA
+R_3gShIjot3ViY3Z1,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_5,0,Spatial analysis models and methods,NA
+R_3gShIjot3ViY3Z1,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_6,30,Better serialization tools ,NA
+R_3gShIjot3ViY3Z1,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_10,0,H2O.ai support ,NA
+R_3gShIjot3ViY3Z1,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_12,10,Other,Cheatsheet
+R_1gIJ9BHIwIIuVRV,I have used tidymodels packages many times,I work in industry,Q5_1,40,Model fairness analysis and metrics,NA
+R_1gIJ9BHIwIIuVRV,I have used tidymodels packages many times,I work in industry,Q5_2,0,Supervised feature selection,NA
+R_1gIJ9BHIwIIuVRV,I have used tidymodels packages many times,I work in industry,Q5_3,10,Probability calibration (post modeling),NA
+R_1gIJ9BHIwIIuVRV,I have used tidymodels packages many times,I work in industry,Q5_4,50,Probability threshold optimization,NA
+R_1gIJ9BHIwIIuVRV,I have used tidymodels packages many times,I work in industry,Q5_5,0,Spatial analysis models and methods,NA
+R_1gIJ9BHIwIIuVRV,I have used tidymodels packages many times,I work in industry,Q5_6,0,Better serialization tools ,NA
+R_1gIJ9BHIwIIuVRV,I have used tidymodels packages many times,I work in industry,Q5_10,0,H2O.ai support ,NA
+R_1gIJ9BHIwIIuVRV,I have used tidymodels packages many times,I work in industry,Q5_12,0,Other,NA
+R_3Oe2kGLvSK9kL8K,I have used tidymodels packages many times,I work in industry,Q5_1,0,Model fairness analysis and metrics,NA
+R_3Oe2kGLvSK9kL8K,I have used tidymodels packages many times,I work in industry,Q5_2,40,Supervised feature selection,NA
+R_3Oe2kGLvSK9kL8K,I have used tidymodels packages many times,I work in industry,Q5_3,40,Probability calibration (post modeling),NA
+R_3Oe2kGLvSK9kL8K,I have used tidymodels packages many times,I work in industry,Q5_4,0,Probability threshold optimization,NA
+R_3Oe2kGLvSK9kL8K,I have used tidymodels packages many times,I work in industry,Q5_5,0,Spatial analysis models and methods,NA
+R_3Oe2kGLvSK9kL8K,I have used tidymodels packages many times,I work in industry,Q5_6,20,Better serialization tools ,NA
+R_3Oe2kGLvSK9kL8K,I have used tidymodels packages many times,I work in industry,Q5_10,0,H2O.ai support ,NA
+R_3Oe2kGLvSK9kL8K,I have used tidymodels packages many times,I work in industry,Q5_12,0,Other,NA
+R_Ab7HH1slo0AiIr7,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_1,0,Model fairness analysis and metrics,NA
+R_Ab7HH1slo0AiIr7,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_2,0,Supervised feature selection,NA
+R_Ab7HH1slo0AiIr7,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_3,50,Probability calibration (post modeling),NA
+R_Ab7HH1slo0AiIr7,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_4,0,Probability threshold optimization,NA
+R_Ab7HH1slo0AiIr7,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_5,0,Spatial analysis models and methods,NA
+R_Ab7HH1slo0AiIr7,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_6,0,Better serialization tools ,NA
+R_Ab7HH1slo0AiIr7,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_10,50,H2O.ai support ,NA
+R_Ab7HH1slo0AiIr7,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_12,0,Other,NA
+R_3JsLDmnRF07r3m7,I have used tidymodels packages many times,I work in industry,Q5_1,0,Model fairness analysis and metrics,NA
+R_3JsLDmnRF07r3m7,I have used tidymodels packages many times,I work in industry,Q5_2,0,Supervised feature selection,NA
+R_3JsLDmnRF07r3m7,I have used tidymodels packages many times,I work in industry,Q5_3,0,Probability calibration (post modeling),NA
+R_3JsLDmnRF07r3m7,I have used tidymodels packages many times,I work in industry,Q5_4,0,Probability threshold optimization,NA
+R_3JsLDmnRF07r3m7,I have used tidymodels packages many times,I work in industry,Q5_5,0,Spatial analysis models and methods,NA
+R_3JsLDmnRF07r3m7,I have used tidymodels packages many times,I work in industry,Q5_6,0,Better serialization tools ,NA
+R_3JsLDmnRF07r3m7,I have used tidymodels packages many times,I work in industry,Q5_10,0,H2O.ai support ,NA
+R_3JsLDmnRF07r3m7,I have used tidymodels packages many times,I work in industry,Q5_12,100,Other,Mlr3 integration
+R_0VxzwMFeoZsRya5,I have used tidymodels packages many times,I work in industry,Q5_1,25,Model fairness analysis and metrics,NA
+R_0VxzwMFeoZsRya5,I have used tidymodels packages many times,I work in industry,Q5_2,20,Supervised feature selection,NA
+R_0VxzwMFeoZsRya5,I have used tidymodels packages many times,I work in industry,Q5_3,15,Probability calibration (post modeling),NA
+R_0VxzwMFeoZsRya5,I have used tidymodels packages many times,I work in industry,Q5_4,30,Probability threshold optimization,NA
+R_0VxzwMFeoZsRya5,I have used tidymodels packages many times,I work in industry,Q5_5,10,Spatial analysis models and methods,NA
+R_0VxzwMFeoZsRya5,I have used tidymodels packages many times,I work in industry,Q5_6,0,Better serialization tools ,NA
+R_0VxzwMFeoZsRya5,I have used tidymodels packages many times,I work in industry,Q5_10,0,H2O.ai support ,NA
+R_0VxzwMFeoZsRya5,I have used tidymodels packages many times,I work in industry,Q5_12,0,Other,NA
+R_0oexfSxjdYdbX7r,I have used tidymodels packages a few times,I work in industry,Q5_1,5,Model fairness analysis and metrics,NA
+R_0oexfSxjdYdbX7r,I have used tidymodels packages a few times,I work in industry,Q5_2,15,Supervised feature selection,NA
+R_0oexfSxjdYdbX7r,I have used tidymodels packages a few times,I work in industry,Q5_3,5,Probability calibration (post modeling),NA
+R_0oexfSxjdYdbX7r,I have used tidymodels packages a few times,I work in industry,Q5_4,10,Probability threshold optimization,NA
+R_0oexfSxjdYdbX7r,I have used tidymodels packages a few times,I work in industry,Q5_5,15,Spatial analysis models and methods,NA
+R_0oexfSxjdYdbX7r,I have used tidymodels packages a few times,I work in industry,Q5_6,35,Better serialization tools ,NA
+R_0oexfSxjdYdbX7r,I have used tidymodels packages a few times,I work in industry,Q5_10,15,H2O.ai support ,NA
+R_0oexfSxjdYdbX7r,I have used tidymodels packages a few times,I work in industry,Q5_12,0,Other,NA
+R_1hyR05sy0Pugoxn,I have never used tidymodels,"I am an academic, professor, and/or researcher",Q5_1,0,Model fairness analysis and metrics,NA
+R_1hyR05sy0Pugoxn,I have never used tidymodels,"I am an academic, professor, and/or researcher",Q5_2,0,Supervised feature selection,NA
+R_1hyR05sy0Pugoxn,I have never used tidymodels,"I am an academic, professor, and/or researcher",Q5_3,0,Probability calibration (post modeling),NA
+R_1hyR05sy0Pugoxn,I have never used tidymodels,"I am an academic, professor, and/or researcher",Q5_4,0,Probability threshold optimization,NA
+R_1hyR05sy0Pugoxn,I have never used tidymodels,"I am an academic, professor, and/or researcher",Q5_5,100,Spatial analysis models and methods,NA
+R_1hyR05sy0Pugoxn,I have never used tidymodels,"I am an academic, professor, and/or researcher",Q5_6,0,Better serialization tools ,NA
+R_1hyR05sy0Pugoxn,I have never used tidymodels,"I am an academic, professor, and/or researcher",Q5_10,0,H2O.ai support ,NA
+R_1hyR05sy0Pugoxn,I have never used tidymodels,"I am an academic, professor, and/or researcher",Q5_12,0,Other,NA
+R_D0ltM9z28AxqO3L,I have used tidymodels packages many times,I work in industry,Q5_1,10,Model fairness analysis and metrics,NA
+R_D0ltM9z28AxqO3L,I have used tidymodels packages many times,I work in industry,Q5_2,30,Supervised feature selection,NA
+R_D0ltM9z28AxqO3L,I have used tidymodels packages many times,I work in industry,Q5_3,0,Probability calibration (post modeling),NA
+R_D0ltM9z28AxqO3L,I have used tidymodels packages many times,I work in industry,Q5_4,0,Probability threshold optimization,NA
+R_D0ltM9z28AxqO3L,I have used tidymodels packages many times,I work in industry,Q5_5,0,Spatial analysis models and methods,NA
+R_D0ltM9z28AxqO3L,I have used tidymodels packages many times,I work in industry,Q5_6,20,Better serialization tools ,NA
+R_D0ltM9z28AxqO3L,I have used tidymodels packages many times,I work in industry,Q5_10,40,H2O.ai support ,NA
+R_D0ltM9z28AxqO3L,I have used tidymodels packages many times,I work in industry,Q5_12,0,Other,NA
+R_DMnpVWncIkHe4HT,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_1,0,Model fairness analysis and metrics,NA
+R_DMnpVWncIkHe4HT,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_2,10,Supervised feature selection,NA
+R_DMnpVWncIkHe4HT,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_3,20,Probability calibration (post modeling),NA
+R_DMnpVWncIkHe4HT,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_4,0,Probability threshold optimization,NA
+R_DMnpVWncIkHe4HT,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_5,30,Spatial analysis models and methods,NA
+R_DMnpVWncIkHe4HT,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_6,30,Better serialization tools ,NA
+R_DMnpVWncIkHe4HT,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_10,10,H2O.ai support ,NA
+R_DMnpVWncIkHe4HT,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_12,0,Other,NA
+R_3M69O01L5Aa2h3a,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_1,20,Model fairness analysis and metrics,NA
+R_3M69O01L5Aa2h3a,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_2,50,Supervised feature selection,NA
+R_3M69O01L5Aa2h3a,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_3,10,Probability calibration (post modeling),NA
+R_3M69O01L5Aa2h3a,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_4,10,Probability threshold optimization,NA
+R_3M69O01L5Aa2h3a,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_5,0,Spatial analysis models and methods,NA
+R_3M69O01L5Aa2h3a,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_6,0,Better serialization tools ,NA
+R_3M69O01L5Aa2h3a,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_10,10,H2O.ai support ,NA
+R_3M69O01L5Aa2h3a,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_12,0,Other,NA
+R_1pFPDh71W1t8DNn,I have used tidymodels packages a few times,I work in industry,Q5_1,30,Model fairness analysis and metrics,NA
+R_1pFPDh71W1t8DNn,I have used tidymodels packages a few times,I work in industry,Q5_2,20,Supervised feature selection,NA
+R_1pFPDh71W1t8DNn,I have used tidymodels packages a few times,I work in industry,Q5_3,0,Probability calibration (post modeling),NA
+R_1pFPDh71W1t8DNn,I have used tidymodels packages a few times,I work in industry,Q5_4,0,Probability threshold optimization,NA
+R_1pFPDh71W1t8DNn,I have used tidymodels packages a few times,I work in industry,Q5_5,0,Spatial analysis models and methods,NA
+R_1pFPDh71W1t8DNn,I have used tidymodels packages a few times,I work in industry,Q5_6,0,Better serialization tools ,NA
+R_1pFPDh71W1t8DNn,I have used tidymodels packages a few times,I work in industry,Q5_10,0,H2O.ai support ,NA
+R_1pFPDh71W1t8DNn,I have used tidymodels packages a few times,I work in industry,Q5_12,50,Other,Better support for one class (outlier) classification models
+R_xa4fV1Pu9FLM1k5,I have used tidymodels packages a few times,I work in industry,Q5_1,80,Model fairness analysis and metrics,NA
+R_xa4fV1Pu9FLM1k5,I have used tidymodels packages a few times,I work in industry,Q5_2,0,Supervised feature selection,NA
+R_xa4fV1Pu9FLM1k5,I have used tidymodels packages a few times,I work in industry,Q5_3,0,Probability calibration (post modeling),NA
+R_xa4fV1Pu9FLM1k5,I have used tidymodels packages a few times,I work in industry,Q5_4,0,Probability threshold optimization,NA
+R_xa4fV1Pu9FLM1k5,I have used tidymodels packages a few times,I work in industry,Q5_5,20,Spatial analysis models and methods,NA
+R_xa4fV1Pu9FLM1k5,I have used tidymodels packages a few times,I work in industry,Q5_6,0,Better serialization tools ,NA
+R_xa4fV1Pu9FLM1k5,I have used tidymodels packages a few times,I work in industry,Q5_10,0,H2O.ai support ,NA
+R_xa4fV1Pu9FLM1k5,I have used tidymodels packages a few times,I work in industry,Q5_12,0,Other,NA
+R_agRLqhTpFgsV6rn,I have used tidymodels packages a few times,I am a student,Q5_1,0,Model fairness analysis and metrics,NA
+R_agRLqhTpFgsV6rn,I have used tidymodels packages a few times,I am a student,Q5_2,100,Supervised feature selection,NA
+R_agRLqhTpFgsV6rn,I have used tidymodels packages a few times,I am a student,Q5_3,0,Probability calibration (post modeling),NA
+R_agRLqhTpFgsV6rn,I have used tidymodels packages a few times,I am a student,Q5_4,0,Probability threshold optimization,NA
+R_agRLqhTpFgsV6rn,I have used tidymodels packages a few times,I am a student,Q5_5,0,Spatial analysis models and methods,NA
+R_agRLqhTpFgsV6rn,I have used tidymodels packages a few times,I am a student,Q5_6,0,Better serialization tools ,NA
+R_agRLqhTpFgsV6rn,I have used tidymodels packages a few times,I am a student,Q5_10,0,H2O.ai support ,NA
+R_agRLqhTpFgsV6rn,I have used tidymodels packages a few times,I am a student,Q5_12,0,Other,Better support for big data
+R_2uBVScFnb72VAiY,I have used tidymodels packages a few times,I work in industry,Q5_1,10,Model fairness analysis and metrics,NA
+R_2uBVScFnb72VAiY,I have used tidymodels packages a few times,I work in industry,Q5_2,35,Supervised feature selection,NA
+R_2uBVScFnb72VAiY,I have used tidymodels packages a few times,I work in industry,Q5_3,10,Probability calibration (post modeling),NA
+R_2uBVScFnb72VAiY,I have used tidymodels packages a few times,I work in industry,Q5_4,20,Probability threshold optimization,NA
+R_2uBVScFnb72VAiY,I have used tidymodels packages a few times,I work in industry,Q5_5,0,Spatial analysis models and methods,NA
+R_2uBVScFnb72VAiY,I have used tidymodels packages a few times,I work in industry,Q5_6,10,Better serialization tools ,NA
+R_2uBVScFnb72VAiY,I have used tidymodels packages a few times,I work in industry,Q5_10,0,H2O.ai support ,NA
+R_2uBVScFnb72VAiY,I have used tidymodels packages a few times,I work in industry,Q5_12,15,Other,(1) Chunk tests a la Frank Harrell (2) Explainability/diagnostic dashboard for users and critics
+R_UrJ3EmZ3OZL6lgt,I have used tidymodels packages a few times,I work in industry,Q5_1,20,Model fairness analysis and metrics,NA
+R_UrJ3EmZ3OZL6lgt,I have used tidymodels packages a few times,I work in industry,Q5_2,20,Supervised feature selection,NA
+R_UrJ3EmZ3OZL6lgt,I have used tidymodels packages a few times,I work in industry,Q5_3,0,Probability calibration (post modeling),NA
+R_UrJ3EmZ3OZL6lgt,I have used tidymodels packages a few times,I work in industry,Q5_4,30,Probability threshold optimization,NA
+R_UrJ3EmZ3OZL6lgt,I have used tidymodels packages a few times,I work in industry,Q5_5,0,Spatial analysis models and methods,NA
+R_UrJ3EmZ3OZL6lgt,I have used tidymodels packages a few times,I work in industry,Q5_6,0,Better serialization tools ,NA
+R_UrJ3EmZ3OZL6lgt,I have used tidymodels packages a few times,I work in industry,Q5_10,30,H2O.ai support ,NA
+R_UrJ3EmZ3OZL6lgt,I have used tidymodels packages a few times,I work in industry,Q5_12,0,Other,NA
+R_pAuIlUsyqHMxm49,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_1,5,Model fairness analysis and metrics,NA
+R_pAuIlUsyqHMxm49,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_2,10,Supervised feature selection,NA
+R_pAuIlUsyqHMxm49,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_3,10,Probability calibration (post modeling),NA
+R_pAuIlUsyqHMxm49,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_4,25,Probability threshold optimization,NA
+R_pAuIlUsyqHMxm49,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_5,20,Spatial analysis models and methods,NA
+R_pAuIlUsyqHMxm49,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_6,30,Better serialization tools ,NA
+R_pAuIlUsyqHMxm49,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_10,0,H2O.ai support ,NA
+R_pAuIlUsyqHMxm49,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_12,0,Other,NA
+R_3JyK3d10J2wO70i,I have contributed to tidymodels packages or taught others how to use them,"I am an academic, professor, and/or researcher",Q5_1,0,Model fairness analysis and metrics,NA
+R_3JyK3d10J2wO70i,I have contributed to tidymodels packages or taught others how to use them,"I am an academic, professor, and/or researcher",Q5_2,0,Supervised feature selection,NA
+R_3JyK3d10J2wO70i,I have contributed to tidymodels packages or taught others how to use them,"I am an academic, professor, and/or researcher",Q5_3,50,Probability calibration (post modeling),NA
+R_3JyK3d10J2wO70i,I have contributed to tidymodels packages or taught others how to use them,"I am an academic, professor, and/or researcher",Q5_4,0,Probability threshold optimization,NA
+R_3JyK3d10J2wO70i,I have contributed to tidymodels packages or taught others how to use them,"I am an academic, professor, and/or researcher",Q5_5,0,Spatial analysis models and methods,NA
+R_3JyK3d10J2wO70i,I have contributed to tidymodels packages or taught others how to use them,"I am an academic, professor, and/or researcher",Q5_6,0,Better serialization tools ,NA
+R_3JyK3d10J2wO70i,I have contributed to tidymodels packages or taught others how to use them,"I am an academic, professor, and/or researcher",Q5_10,0,H2O.ai support ,NA
+R_3JyK3d10J2wO70i,I have contributed to tidymodels packages or taught others how to use them,"I am an academic, professor, and/or researcher",Q5_12,50,Other,Weighted loss / weights
+R_r87X06HmGUJae9b,I have used tidymodels packages many times,I work in industry,Q5_1,0,Model fairness analysis and metrics,NA
+R_r87X06HmGUJae9b,I have used tidymodels packages many times,I work in industry,Q5_2,0,Supervised feature selection,NA
+R_r87X06HmGUJae9b,I have used tidymodels packages many times,I work in industry,Q5_3,100,Probability calibration (post modeling),NA
+R_r87X06HmGUJae9b,I have used tidymodels packages many times,I work in industry,Q5_4,0,Probability threshold optimization,NA
+R_r87X06HmGUJae9b,I have used tidymodels packages many times,I work in industry,Q5_5,0,Spatial analysis models and methods,NA
+R_r87X06HmGUJae9b,I have used tidymodels packages many times,I work in industry,Q5_6,0,Better serialization tools ,NA
+R_r87X06HmGUJae9b,I have used tidymodels packages many times,I work in industry,Q5_10,0,H2O.ai support ,NA
+R_r87X06HmGUJae9b,I have used tidymodels packages many times,I work in industry,Q5_12,0,Other,NA
+R_11cNqzkHTtN9dFR,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_1,5,Model fairness analysis and metrics,NA
+R_11cNqzkHTtN9dFR,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_2,5,Supervised feature selection,NA
+R_11cNqzkHTtN9dFR,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_3,20,Probability calibration (post modeling),NA
+R_11cNqzkHTtN9dFR,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_4,0,Probability threshold optimization,NA
+R_11cNqzkHTtN9dFR,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_5,10,Spatial analysis models and methods,NA
+R_11cNqzkHTtN9dFR,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_6,40,Better serialization tools ,NA
+R_11cNqzkHTtN9dFR,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_10,20,H2O.ai support ,NA
+R_11cNqzkHTtN9dFR,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_12,0,Other,NA
+R_2abFzxkbSION2NJ,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_1,10,Model fairness analysis and metrics,NA
+R_2abFzxkbSION2NJ,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_2,20,Supervised feature selection,NA
+R_2abFzxkbSION2NJ,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_3,10,Probability calibration (post modeling),NA
+R_2abFzxkbSION2NJ,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_4,0,Probability threshold optimization,NA
+R_2abFzxkbSION2NJ,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_5,10,Spatial analysis models and methods,NA
+R_2abFzxkbSION2NJ,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_6,10,Better serialization tools ,NA
+R_2abFzxkbSION2NJ,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_10,40,H2O.ai support ,NA
+R_2abFzxkbSION2NJ,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_12,0,Other,NA
+R_RhlWNVDT7WjWPCh,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_1,20,Model fairness analysis and metrics,NA
+R_RhlWNVDT7WjWPCh,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_2,0,Supervised feature selection,NA
+R_RhlWNVDT7WjWPCh,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_3,20,Probability calibration (post modeling),NA
+R_RhlWNVDT7WjWPCh,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_4,0,Probability threshold optimization,NA
+R_RhlWNVDT7WjWPCh,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_5,0,Spatial analysis models and methods,NA
+R_RhlWNVDT7WjWPCh,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_6,0,Better serialization tools ,NA
+R_RhlWNVDT7WjWPCh,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_10,0,H2O.ai support ,NA
+R_RhlWNVDT7WjWPCh,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_12,60,Other,torch integration
+R_71xzhT4tWZdKl5D,I have contributed to tidymodels packages or taught others how to use them,"I am an academic, professor, and/or researcher",Q5_1,0,Model fairness analysis and metrics,NA
+R_71xzhT4tWZdKl5D,I have contributed to tidymodels packages or taught others how to use them,"I am an academic, professor, and/or researcher",Q5_2,10,Supervised feature selection,NA
+R_71xzhT4tWZdKl5D,I have contributed to tidymodels packages or taught others how to use them,"I am an academic, professor, and/or researcher",Q5_3,20,Probability calibration (post modeling),NA
+R_71xzhT4tWZdKl5D,I have contributed to tidymodels packages or taught others how to use them,"I am an academic, professor, and/or researcher",Q5_4,20,Probability threshold optimization,NA
+R_71xzhT4tWZdKl5D,I have contributed to tidymodels packages or taught others how to use them,"I am an academic, professor, and/or researcher",Q5_5,50,Spatial analysis models and methods,NA
+R_71xzhT4tWZdKl5D,I have contributed to tidymodels packages or taught others how to use them,"I am an academic, professor, and/or researcher",Q5_6,0,Better serialization tools ,NA
+R_71xzhT4tWZdKl5D,I have contributed to tidymodels packages or taught others how to use them,"I am an academic, professor, and/or researcher",Q5_10,0,H2O.ai support ,NA
+R_71xzhT4tWZdKl5D,I have contributed to tidymodels packages or taught others how to use them,"I am an academic, professor, and/or researcher",Q5_12,0,Other,NA
+R_1H5nmS8yYRJwBd7,I have used tidymodels packages a few times,I am a student,Q5_1,15,Model fairness analysis and metrics,NA
+R_1H5nmS8yYRJwBd7,I have used tidymodels packages a few times,I am a student,Q5_2,20,Supervised feature selection,NA
+R_1H5nmS8yYRJwBd7,I have used tidymodels packages a few times,I am a student,Q5_3,20,Probability calibration (post modeling),NA
+R_1H5nmS8yYRJwBd7,I have used tidymodels packages a few times,I am a student,Q5_4,20,Probability threshold optimization,NA
+R_1H5nmS8yYRJwBd7,I have used tidymodels packages a few times,I am a student,Q5_5,5,Spatial analysis models and methods,NA
+R_1H5nmS8yYRJwBd7,I have used tidymodels packages a few times,I am a student,Q5_6,20,Better serialization tools ,NA
+R_1H5nmS8yYRJwBd7,I have used tidymodels packages a few times,I am a student,Q5_10,0,H2O.ai support ,NA
+R_1H5nmS8yYRJwBd7,I have used tidymodels packages a few times,I am a student,Q5_12,0,Other,NA
+R_29husG8Ab2BGAZj,I have used tidymodels packages many times,I work in industry,Q5_1,30,Model fairness analysis and metrics,NA
+R_29husG8Ab2BGAZj,I have used tidymodels packages many times,I work in industry,Q5_2,25,Supervised feature selection,NA
+R_29husG8Ab2BGAZj,I have used tidymodels packages many times,I work in industry,Q5_3,10,Probability calibration (post modeling),NA
+R_29husG8Ab2BGAZj,I have used tidymodels packages many times,I work in industry,Q5_4,0,Probability threshold optimization,NA
+R_29husG8Ab2BGAZj,I have used tidymodels packages many times,I work in industry,Q5_5,20,Spatial analysis models and methods,NA
+R_29husG8Ab2BGAZj,I have used tidymodels packages many times,I work in industry,Q5_6,0,Better serialization tools ,NA
+R_29husG8Ab2BGAZj,I have used tidymodels packages many times,I work in industry,Q5_10,15,H2O.ai support ,NA
+R_29husG8Ab2BGAZj,I have used tidymodels packages many times,I work in industry,Q5_12,0,Other,NA
+R_3D279IiUTW5ZOOJ,I have used tidymodels packages many times,I work in industry,Q5_1,50,Model fairness analysis and metrics,NA
+R_3D279IiUTW5ZOOJ,I have used tidymodels packages many times,I work in industry,Q5_2,25,Supervised feature selection,NA
+R_3D279IiUTW5ZOOJ,I have used tidymodels packages many times,I work in industry,Q5_3,25,Probability calibration (post modeling),NA
+R_3D279IiUTW5ZOOJ,I have used tidymodels packages many times,I work in industry,Q5_4,0,Probability threshold optimization,NA
+R_3D279IiUTW5ZOOJ,I have used tidymodels packages many times,I work in industry,Q5_5,0,Spatial analysis models and methods,NA
+R_3D279IiUTW5ZOOJ,I have used tidymodels packages many times,I work in industry,Q5_6,0,Better serialization tools ,NA
+R_3D279IiUTW5ZOOJ,I have used tidymodels packages many times,I work in industry,Q5_10,0,H2O.ai support ,NA
+R_3D279IiUTW5ZOOJ,I have used tidymodels packages many times,I work in industry,Q5_12,0,Other,NA
+R_9zSEEnQEFC4uCBj,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_1,30,Model fairness analysis and metrics,NA
+R_9zSEEnQEFC4uCBj,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_2,30,Supervised feature selection,NA
+R_9zSEEnQEFC4uCBj,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_3,0,Probability calibration (post modeling),NA
+R_9zSEEnQEFC4uCBj,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_4,20,Probability threshold optimization,NA
+R_9zSEEnQEFC4uCBj,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_5,10,Spatial analysis models and methods,NA
+R_9zSEEnQEFC4uCBj,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_6,10,Better serialization tools ,NA
+R_9zSEEnQEFC4uCBj,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_10,0,H2O.ai support ,NA
+R_9zSEEnQEFC4uCBj,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_12,0,Other,NA
+R_1oBBHdycIiPtPBv,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_1,10,Model fairness analysis and metrics,NA
+R_1oBBHdycIiPtPBv,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_2,10,Supervised feature selection,NA
+R_1oBBHdycIiPtPBv,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_3,10,Probability calibration (post modeling),NA
+R_1oBBHdycIiPtPBv,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_4,10,Probability threshold optimization,NA
+R_1oBBHdycIiPtPBv,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_5,10,Spatial analysis models and methods,NA
+R_1oBBHdycIiPtPBv,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_6,20,Better serialization tools ,NA
+R_1oBBHdycIiPtPBv,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_10,0,H2O.ai support ,NA
+R_1oBBHdycIiPtPBv,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_12,30,Other,Handle big dataset
+R_12Kh25oJJogmHOW,I have never used tidymodels,I work in industry,Q5_1,30,Model fairness analysis and metrics,NA
+R_12Kh25oJJogmHOW,I have never used tidymodels,I work in industry,Q5_2,50,Supervised feature selection,NA
+R_12Kh25oJJogmHOW,I have never used tidymodels,I work in industry,Q5_3,10,Probability calibration (post modeling),NA
+R_12Kh25oJJogmHOW,I have never used tidymodels,I work in industry,Q5_4,10,Probability threshold optimization,NA
+R_12Kh25oJJogmHOW,I have never used tidymodels,I work in industry,Q5_5,0,Spatial analysis models and methods,NA
+R_12Kh25oJJogmHOW,I have never used tidymodels,I work in industry,Q5_6,0,Better serialization tools ,NA
+R_12Kh25oJJogmHOW,I have never used tidymodels,I work in industry,Q5_10,0,H2O.ai support ,NA
+R_12Kh25oJJogmHOW,I have never used tidymodels,I work in industry,Q5_12,0,Other,NA
+R_3hzksYcZ8Ux2ein,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_1,50,Model fairness analysis and metrics,NA
+R_3hzksYcZ8Ux2ein,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_2,20,Supervised feature selection,NA
+R_3hzksYcZ8Ux2ein,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_3,0,Probability calibration (post modeling),NA
+R_3hzksYcZ8Ux2ein,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_4,20,Probability threshold optimization,NA
+R_3hzksYcZ8Ux2ein,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_5,0,Spatial analysis models and methods,NA
+R_3hzksYcZ8Ux2ein,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_6,10,Better serialization tools ,NA
+R_3hzksYcZ8Ux2ein,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_10,0,H2O.ai support ,NA
+R_3hzksYcZ8Ux2ein,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_12,0,Other,NA
+R_21zeq0dg64kX49O,I have used tidymodels packages many times,I work in industry,Q5_1,5,Model fairness analysis and metrics,NA
+R_21zeq0dg64kX49O,I have used tidymodels packages many times,I work in industry,Q5_2,20,Supervised feature selection,NA
+R_21zeq0dg64kX49O,I have used tidymodels packages many times,I work in industry,Q5_3,5,Probability calibration (post modeling),NA
+R_21zeq0dg64kX49O,I have used tidymodels packages many times,I work in industry,Q5_4,15,Probability threshold optimization,NA
+R_21zeq0dg64kX49O,I have used tidymodels packages many times,I work in industry,Q5_5,15,Spatial analysis models and methods,NA
+R_21zeq0dg64kX49O,I have used tidymodels packages many times,I work in industry,Q5_6,5,Better serialization tools ,NA
+R_21zeq0dg64kX49O,I have used tidymodels packages many times,I work in industry,Q5_10,35,H2O.ai support ,NA
+R_21zeq0dg64kX49O,I have used tidymodels packages many times,I work in industry,Q5_12,0,Other,NA
+R_3EKcS7tvRY3CSgy,I have used tidymodels packages a few times,I work in industry,Q5_1,0,Model fairness analysis and metrics,NA
+R_3EKcS7tvRY3CSgy,I have used tidymodels packages a few times,I work in industry,Q5_2,30,Supervised feature selection,NA
+R_3EKcS7tvRY3CSgy,I have used tidymodels packages a few times,I work in industry,Q5_3,0,Probability calibration (post modeling),NA
+R_3EKcS7tvRY3CSgy,I have used tidymodels packages a few times,I work in industry,Q5_4,0,Probability threshold optimization,NA
+R_3EKcS7tvRY3CSgy,I have used tidymodels packages a few times,I work in industry,Q5_5,10,Spatial analysis models and methods,NA
+R_3EKcS7tvRY3CSgy,I have used tidymodels packages a few times,I work in industry,Q5_6,10,Better serialization tools ,NA
+R_3EKcS7tvRY3CSgy,I have used tidymodels packages a few times,I work in industry,Q5_10,50,H2O.ai support ,NA
+R_3EKcS7tvRY3CSgy,I have used tidymodels packages a few times,I work in industry,Q5_12,0,Other,NA
+R_WcYU8EfL4JpPQw9,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_1,10,Model fairness analysis and metrics,NA
+R_WcYU8EfL4JpPQw9,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_2,25,Supervised feature selection,NA
+R_WcYU8EfL4JpPQw9,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_3,30,Probability calibration (post modeling),NA
+R_WcYU8EfL4JpPQw9,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_4,10,Probability threshold optimization,NA
+R_WcYU8EfL4JpPQw9,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_5,10,Spatial analysis models and methods,NA
+R_WcYU8EfL4JpPQw9,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_6,15,Better serialization tools ,NA
+R_WcYU8EfL4JpPQw9,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_10,0,H2O.ai support ,NA
+R_WcYU8EfL4JpPQw9,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_12,0,Other,NA
+R_bgAiRaKK5qvhyiB,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_1,0,Model fairness analysis and metrics,NA
+R_bgAiRaKK5qvhyiB,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_2,35,Supervised feature selection,NA
+R_bgAiRaKK5qvhyiB,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_3,15,Probability calibration (post modeling),NA
+R_bgAiRaKK5qvhyiB,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_4,15,Probability threshold optimization,NA
+R_bgAiRaKK5qvhyiB,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_5,35,Spatial analysis models and methods,NA
+R_bgAiRaKK5qvhyiB,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_6,0,Better serialization tools ,NA
+R_bgAiRaKK5qvhyiB,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_10,0,H2O.ai support ,NA
+R_bgAiRaKK5qvhyiB,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_12,0,Other,NA
+R_2AF62Lsv2LW8DE4,I have used tidymodels packages many times,I am a hobbyist,Q5_1,20,Model fairness analysis and metrics,NA
+R_2AF62Lsv2LW8DE4,I have used tidymodels packages many times,I am a hobbyist,Q5_2,10,Supervised feature selection,NA
+R_2AF62Lsv2LW8DE4,I have used tidymodels packages many times,I am a hobbyist,Q5_3,10,Probability calibration (post modeling),NA
+R_2AF62Lsv2LW8DE4,I have used tidymodels packages many times,I am a hobbyist,Q5_4,10,Probability threshold optimization,NA
+R_2AF62Lsv2LW8DE4,I have used tidymodels packages many times,I am a hobbyist,Q5_5,25,Spatial analysis models and methods,NA
+R_2AF62Lsv2LW8DE4,I have used tidymodels packages many times,I am a hobbyist,Q5_6,25,Better serialization tools ,NA
+R_2AF62Lsv2LW8DE4,I have used tidymodels packages many times,I am a hobbyist,Q5_10,0,H2O.ai support ,NA
+R_2AF62Lsv2LW8DE4,I have used tidymodels packages many times,I am a hobbyist,Q5_12,0,Other,NA
+R_3oXSo3vmRI69e8q,I have used tidymodels packages a few times,I am a hobbyist,Q5_1,10,Model fairness analysis and metrics,NA
+R_3oXSo3vmRI69e8q,I have used tidymodels packages a few times,I am a hobbyist,Q5_2,20,Supervised feature selection,NA
+R_3oXSo3vmRI69e8q,I have used tidymodels packages a few times,I am a hobbyist,Q5_3,10,Probability calibration (post modeling),NA
+R_3oXSo3vmRI69e8q,I have used tidymodels packages a few times,I am a hobbyist,Q5_4,20,Probability threshold optimization,NA
+R_3oXSo3vmRI69e8q,I have used tidymodels packages a few times,I am a hobbyist,Q5_5,10,Spatial analysis models and methods,NA
+R_3oXSo3vmRI69e8q,I have used tidymodels packages a few times,I am a hobbyist,Q5_6,20,Better serialization tools ,NA
+R_3oXSo3vmRI69e8q,I have used tidymodels packages a few times,I am a hobbyist,Q5_10,10,H2O.ai support ,NA
+R_3oXSo3vmRI69e8q,I have used tidymodels packages a few times,I am a hobbyist,Q5_12,0,Other,NA
+R_31zoNDmYu3SYocp,I have never used tidymodels,I work in industry,Q5_1,0,Model fairness analysis and metrics,NA
+R_31zoNDmYu3SYocp,I have never used tidymodels,I work in industry,Q5_2,0,Supervised feature selection,NA
+R_31zoNDmYu3SYocp,I have never used tidymodels,I work in industry,Q5_3,0,Probability calibration (post modeling),NA
+R_31zoNDmYu3SYocp,I have never used tidymodels,I work in industry,Q5_4,0,Probability threshold optimization,NA
+R_31zoNDmYu3SYocp,I have never used tidymodels,I work in industry,Q5_5,0,Spatial analysis models and methods,NA
+R_31zoNDmYu3SYocp,I have never used tidymodels,I work in industry,Q5_6,0,Better serialization tools ,NA
+R_31zoNDmYu3SYocp,I have never used tidymodels,I work in industry,Q5_10,0,H2O.ai support ,NA
+R_31zoNDmYu3SYocp,I have never used tidymodels,I work in industry,Q5_12,100,Other,Time series
+R_3JsnK05dpNpJiIg,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_1,30,Model fairness analysis and metrics,NA
+R_3JsnK05dpNpJiIg,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_2,20,Supervised feature selection,NA
+R_3JsnK05dpNpJiIg,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_3,20,Probability calibration (post modeling),NA
+R_3JsnK05dpNpJiIg,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_4,0,Probability threshold optimization,NA
+R_3JsnK05dpNpJiIg,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_5,10,Spatial analysis models and methods,NA
+R_3JsnK05dpNpJiIg,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_6,0,Better serialization tools ,NA
+R_3JsnK05dpNpJiIg,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_10,20,H2O.ai support ,NA
+R_3JsnK05dpNpJiIg,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_12,0,Other,NA
+R_1kFxPUwOcCSpdEk,I have used tidymodels packages a few times,I work in industry,Q5_1,35,Model fairness analysis and metrics,NA
+R_1kFxPUwOcCSpdEk,I have used tidymodels packages a few times,I work in industry,Q5_2,35,Supervised feature selection,NA
+R_1kFxPUwOcCSpdEk,I have used tidymodels packages a few times,I work in industry,Q5_3,30,Probability calibration (post modeling),NA
+R_1kFxPUwOcCSpdEk,I have used tidymodels packages a few times,I work in industry,Q5_4,0,Probability threshold optimization,NA
+R_1kFxPUwOcCSpdEk,I have used tidymodels packages a few times,I work in industry,Q5_5,0,Spatial analysis models and methods,NA
+R_1kFxPUwOcCSpdEk,I have used tidymodels packages a few times,I work in industry,Q5_6,0,Better serialization tools ,NA
+R_1kFxPUwOcCSpdEk,I have used tidymodels packages a few times,I work in industry,Q5_10,0,H2O.ai support ,NA
+R_1kFxPUwOcCSpdEk,I have used tidymodels packages a few times,I work in industry,Q5_12,0,Other,NA
+R_1ml7DNdv7vregrA,I have used tidymodels packages a few times,I work in industry,Q5_1,0,Model fairness analysis and metrics,NA
+R_1ml7DNdv7vregrA,I have used tidymodels packages a few times,I work in industry,Q5_2,30,Supervised feature selection,NA
+R_1ml7DNdv7vregrA,I have used tidymodels packages a few times,I work in industry,Q5_3,15,Probability calibration (post modeling),NA
+R_1ml7DNdv7vregrA,I have used tidymodels packages a few times,I work in industry,Q5_4,10,Probability threshold optimization,NA
+R_1ml7DNdv7vregrA,I have used tidymodels packages a few times,I work in industry,Q5_5,0,Spatial analysis models and methods,NA
+R_1ml7DNdv7vregrA,I have used tidymodels packages a few times,I work in industry,Q5_6,15,Better serialization tools ,NA
+R_1ml7DNdv7vregrA,I have used tidymodels packages a few times,I work in industry,Q5_10,30,H2O.ai support ,NA
+R_1ml7DNdv7vregrA,I have used tidymodels packages a few times,I work in industry,Q5_12,0,Other,NA
+R_1MMUDSZIUBSnQBP,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_1,0,Model fairness analysis and metrics,NA
+R_1MMUDSZIUBSnQBP,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_2,40,Supervised feature selection,NA
+R_1MMUDSZIUBSnQBP,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_3,0,Probability calibration (post modeling),NA
+R_1MMUDSZIUBSnQBP,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_4,20,Probability threshold optimization,NA
+R_1MMUDSZIUBSnQBP,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_5,0,Spatial analysis models and methods,NA
+R_1MMUDSZIUBSnQBP,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_6,0,Better serialization tools ,NA
+R_1MMUDSZIUBSnQBP,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_10,40,H2O.ai support ,NA
+R_1MMUDSZIUBSnQBP,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_12,0,Other,NA
+R_3meq14LLHtkTg0C,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_1,0,Model fairness analysis and metrics,NA
+R_3meq14LLHtkTg0C,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_2,0,Supervised feature selection,NA
+R_3meq14LLHtkTg0C,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_3,0,Probability calibration (post modeling),NA
+R_3meq14LLHtkTg0C,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_4,0,Probability threshold optimization,NA
+R_3meq14LLHtkTg0C,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_5,0,Spatial analysis models and methods,NA
+R_3meq14LLHtkTg0C,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_6,40,Better serialization tools ,NA
+R_3meq14LLHtkTg0C,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_10,50,H2O.ai support ,NA
+R_3meq14LLHtkTg0C,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_12,10,Other,Improved Ensamble Models (Stacks)
+R_2AGWWib4m4AWnEi,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_1,12,Model fairness analysis and metrics,NA
+R_2AGWWib4m4AWnEi,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_2,25,Supervised feature selection,NA
+R_2AGWWib4m4AWnEi,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_3,13,Probability calibration (post modeling),NA
+R_2AGWWib4m4AWnEi,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_4,0,Probability threshold optimization,NA
+R_2AGWWib4m4AWnEi,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_5,50,Spatial analysis models and methods,NA
+R_2AGWWib4m4AWnEi,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_6,0,Better serialization tools ,NA
+R_2AGWWib4m4AWnEi,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_10,0,H2O.ai support ,NA
+R_2AGWWib4m4AWnEi,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_12,0,Other,NA
+R_24lc68acSOP4sgE,I have used tidymodels packages many times,I am a hobbyist,Q5_1,0,Model fairness analysis and metrics,NA
+R_24lc68acSOP4sgE,I have used tidymodels packages many times,I am a hobbyist,Q5_2,0,Supervised feature selection,NA
+R_24lc68acSOP4sgE,I have used tidymodels packages many times,I am a hobbyist,Q5_3,0,Probability calibration (post modeling),NA
+R_24lc68acSOP4sgE,I have used tidymodels packages many times,I am a hobbyist,Q5_4,0,Probability threshold optimization,NA
+R_24lc68acSOP4sgE,I have used tidymodels packages many times,I am a hobbyist,Q5_5,60,Spatial analysis models and methods,NA
+R_24lc68acSOP4sgE,I have used tidymodels packages many times,I am a hobbyist,Q5_6,40,Better serialization tools ,NA
+R_24lc68acSOP4sgE,I have used tidymodels packages many times,I am a hobbyist,Q5_10,0,H2O.ai support ,NA
+R_24lc68acSOP4sgE,I have used tidymodels packages many times,I am a hobbyist,Q5_12,0,Other,NA
+R_1IME1kKmGtt7DZv,I have used tidymodels packages many times,I work in industry,Q5_1,30,Model fairness analysis and metrics,NA
+R_1IME1kKmGtt7DZv,I have used tidymodels packages many times,I work in industry,Q5_2,15,Supervised feature selection,NA
+R_1IME1kKmGtt7DZv,I have used tidymodels packages many times,I work in industry,Q5_3,30,Probability calibration (post modeling),NA
+R_1IME1kKmGtt7DZv,I have used tidymodels packages many times,I work in industry,Q5_4,5,Probability threshold optimization,NA
+R_1IME1kKmGtt7DZv,I have used tidymodels packages many times,I work in industry,Q5_5,5,Spatial analysis models and methods,NA
+R_1IME1kKmGtt7DZv,I have used tidymodels packages many times,I work in industry,Q5_6,15,Better serialization tools ,NA
+R_1IME1kKmGtt7DZv,I have used tidymodels packages many times,I work in industry,Q5_10,0,H2O.ai support ,NA
+R_1IME1kKmGtt7DZv,I have used tidymodels packages many times,I work in industry,Q5_12,0,Other,NA
+R_3I5LKVFFlfpoA9f,I have used tidymodels packages a few times,I work in industry,Q5_1,30,Model fairness analysis and metrics,NA
+R_3I5LKVFFlfpoA9f,I have used tidymodels packages a few times,I work in industry,Q5_2,15,Supervised feature selection,NA
+R_3I5LKVFFlfpoA9f,I have used tidymodels packages a few times,I work in industry,Q5_3,20,Probability calibration (post modeling),NA
+R_3I5LKVFFlfpoA9f,I have used tidymodels packages a few times,I work in industry,Q5_4,10,Probability threshold optimization,NA
+R_3I5LKVFFlfpoA9f,I have used tidymodels packages a few times,I work in industry,Q5_5,0,Spatial analysis models and methods,NA
+R_3I5LKVFFlfpoA9f,I have used tidymodels packages a few times,I work in industry,Q5_6,10,Better serialization tools ,NA
+R_3I5LKVFFlfpoA9f,I have used tidymodels packages a few times,I work in industry,Q5_10,15,H2O.ai support ,NA
+R_3I5LKVFFlfpoA9f,I have used tidymodels packages a few times,I work in industry,Q5_12,0,Other,NA
+R_1jqyeipnbQKM8xL,I have used tidymodels packages a few times,I work in industry,Q5_1,20,Model fairness analysis and metrics,NA
+R_1jqyeipnbQKM8xL,I have used tidymodels packages a few times,I work in industry,Q5_2,40,Supervised feature selection,NA
+R_1jqyeipnbQKM8xL,I have used tidymodels packages a few times,I work in industry,Q5_3,0,Probability calibration (post modeling),NA
+R_1jqyeipnbQKM8xL,I have used tidymodels packages a few times,I work in industry,Q5_4,0,Probability threshold optimization,NA
+R_1jqyeipnbQKM8xL,I have used tidymodels packages a few times,I work in industry,Q5_5,0,Spatial analysis models and methods,NA
+R_1jqyeipnbQKM8xL,I have used tidymodels packages a few times,I work in industry,Q5_6,0,Better serialization tools ,NA
+R_1jqyeipnbQKM8xL,I have used tidymodels packages a few times,I work in industry,Q5_10,0,H2O.ai support ,NA
+R_1jqyeipnbQKM8xL,I have used tidymodels packages a few times,I work in industry,Q5_12,40,Other,Unsupervised learning methods
+R_2qC247OngBQACRf,I have never used tidymodels,"I am an academic, professor, and/or researcher",Q5_1,0,Model fairness analysis and metrics,NA
+R_2qC247OngBQACRf,I have never used tidymodels,"I am an academic, professor, and/or researcher",Q5_2,0,Supervised feature selection,NA
+R_2qC247OngBQACRf,I have never used tidymodels,"I am an academic, professor, and/or researcher",Q5_3,0,Probability calibration (post modeling),NA
+R_2qC247OngBQACRf,I have never used tidymodels,"I am an academic, professor, and/or researcher",Q5_4,0,Probability threshold optimization,NA
+R_2qC247OngBQACRf,I have never used tidymodels,"I am an academic, professor, and/or researcher",Q5_5,20,Spatial analysis models and methods,NA
+R_2qC247OngBQACRf,I have never used tidymodels,"I am an academic, professor, and/or researcher",Q5_6,0,Better serialization tools ,NA
+R_2qC247OngBQACRf,I have never used tidymodels,"I am an academic, professor, and/or researcher",Q5_10,80,H2O.ai support ,NA
+R_2qC247OngBQACRf,I have never used tidymodels,"I am an academic, professor, and/or researcher",Q5_12,0,Other,NA
+R_ZqmczkRANtil2KJ,I have used tidymodels packages a few times,I work in industry,Q5_1,0,Model fairness analysis and metrics,NA
+R_ZqmczkRANtil2KJ,I have used tidymodels packages a few times,I work in industry,Q5_2,20,Supervised feature selection,NA
+R_ZqmczkRANtil2KJ,I have used tidymodels packages a few times,I work in industry,Q5_3,20,Probability calibration (post modeling),NA
+R_ZqmczkRANtil2KJ,I have used tidymodels packages a few times,I work in industry,Q5_4,50,Probability threshold optimization,NA
+R_ZqmczkRANtil2KJ,I have used tidymodels packages a few times,I work in industry,Q5_5,0,Spatial analysis models and methods,NA
+R_ZqmczkRANtil2KJ,I have used tidymodels packages a few times,I work in industry,Q5_6,0,Better serialization tools ,NA
+R_ZqmczkRANtil2KJ,I have used tidymodels packages a few times,I work in industry,Q5_10,0,H2O.ai support ,NA
+R_ZqmczkRANtil2KJ,I have used tidymodels packages a few times,I work in industry,Q5_12,10,Other,Spark integration
+R_ZqvnYF3xYg7jFXH,I have used tidymodels packages a few times,I work in industry,Q5_1,0,Model fairness analysis and metrics,NA
+R_ZqvnYF3xYg7jFXH,I have used tidymodels packages a few times,I work in industry,Q5_2,45,Supervised feature selection,NA
+R_ZqvnYF3xYg7jFXH,I have used tidymodels packages a few times,I work in industry,Q5_3,0,Probability calibration (post modeling),NA
+R_ZqvnYF3xYg7jFXH,I have used tidymodels packages a few times,I work in industry,Q5_4,0,Probability threshold optimization,NA
+R_ZqvnYF3xYg7jFXH,I have used tidymodels packages a few times,I work in industry,Q5_5,5,Spatial analysis models and methods,NA
+R_ZqvnYF3xYg7jFXH,I have used tidymodels packages a few times,I work in industry,Q5_6,50,Better serialization tools ,NA
+R_ZqvnYF3xYg7jFXH,I have used tidymodels packages a few times,I work in industry,Q5_10,0,H2O.ai support ,NA
+R_ZqvnYF3xYg7jFXH,I have used tidymodels packages a few times,I work in industry,Q5_12,0,Other,NA
+R_stbCxwwAuGIpSyB,I have used tidymodels packages many times,I work in industry,Q5_1,0,Model fairness analysis and metrics,NA
+R_stbCxwwAuGIpSyB,I have used tidymodels packages many times,I work in industry,Q5_2,20,Supervised feature selection,NA
+R_stbCxwwAuGIpSyB,I have used tidymodels packages many times,I work in industry,Q5_3,30,Probability calibration (post modeling),NA
+R_stbCxwwAuGIpSyB,I have used tidymodels packages many times,I work in industry,Q5_4,20,Probability threshold optimization,NA
+R_stbCxwwAuGIpSyB,I have used tidymodels packages many times,I work in industry,Q5_5,0,Spatial analysis models and methods,NA
+R_stbCxwwAuGIpSyB,I have used tidymodels packages many times,I work in industry,Q5_6,0,Better serialization tools ,NA
+R_stbCxwwAuGIpSyB,I have used tidymodels packages many times,I work in industry,Q5_10,0,H2O.ai support ,NA
+R_stbCxwwAuGIpSyB,I have used tidymodels packages many times,I work in industry,Q5_12,30,Other,Learning Curves
+R_PBZTgR4xqKF0Kkh,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_1,0,Model fairness analysis and metrics,NA
+R_PBZTgR4xqKF0Kkh,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_2,10,Supervised feature selection,NA
+R_PBZTgR4xqKF0Kkh,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_3,10,Probability calibration (post modeling),NA
+R_PBZTgR4xqKF0Kkh,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_4,20,Probability threshold optimization,NA
+R_PBZTgR4xqKF0Kkh,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_5,0,Spatial analysis models and methods,NA
+R_PBZTgR4xqKF0Kkh,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_6,30,Better serialization tools ,NA
+R_PBZTgR4xqKF0Kkh,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_10,30,H2O.ai support ,NA
+R_PBZTgR4xqKF0Kkh,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_12,0,Other,NA
+R_1FFchevyfQW5Txt,I have used tidymodels packages many times,I work in industry,Q5_1,0,Model fairness analysis and metrics,NA
+R_1FFchevyfQW5Txt,I have used tidymodels packages many times,I work in industry,Q5_2,30,Supervised feature selection,NA
+R_1FFchevyfQW5Txt,I have used tidymodels packages many times,I work in industry,Q5_3,0,Probability calibration (post modeling),NA
+R_1FFchevyfQW5Txt,I have used tidymodels packages many times,I work in industry,Q5_4,20,Probability threshold optimization,NA
+R_1FFchevyfQW5Txt,I have used tidymodels packages many times,I work in industry,Q5_5,0,Spatial analysis models and methods,NA
+R_1FFchevyfQW5Txt,I have used tidymodels packages many times,I work in industry,Q5_6,0,Better serialization tools ,NA
+R_1FFchevyfQW5Txt,I have used tidymodels packages many times,I work in industry,Q5_10,50,H2O.ai support ,NA
+R_1FFchevyfQW5Txt,I have used tidymodels packages many times,I work in industry,Q5_12,0,Other,NA
+R_1mWNrDmdl2DjchW,I have used tidymodels packages a few times,I work in industry,Q5_1,0,Model fairness analysis and metrics,NA
+R_1mWNrDmdl2DjchW,I have used tidymodels packages a few times,I work in industry,Q5_2,15,Supervised feature selection,NA
+R_1mWNrDmdl2DjchW,I have used tidymodels packages a few times,I work in industry,Q5_3,0,Probability calibration (post modeling),NA
+R_1mWNrDmdl2DjchW,I have used tidymodels packages a few times,I work in industry,Q5_4,0,Probability threshold optimization,NA
+R_1mWNrDmdl2DjchW,I have used tidymodels packages a few times,I work in industry,Q5_5,0,Spatial analysis models and methods,NA
+R_1mWNrDmdl2DjchW,I have used tidymodels packages a few times,I work in industry,Q5_6,15,Better serialization tools ,NA
+R_1mWNrDmdl2DjchW,I have used tidymodels packages a few times,I work in industry,Q5_10,70,H2O.ai support ,NA
+R_1mWNrDmdl2DjchW,I have used tidymodels packages a few times,I work in industry,Q5_12,0,Other,NA
+R_bKRGpG89T1Ow3xD,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_1,10,Model fairness analysis and metrics,NA
+R_bKRGpG89T1Ow3xD,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_2,30,Supervised feature selection,NA
+R_bKRGpG89T1Ow3xD,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_3,10,Probability calibration (post modeling),NA
+R_bKRGpG89T1Ow3xD,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_4,0,Probability threshold optimization,NA
+R_bKRGpG89T1Ow3xD,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_5,0,Spatial analysis models and methods,NA
+R_bKRGpG89T1Ow3xD,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_6,30,Better serialization tools ,NA
+R_bKRGpG89T1Ow3xD,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_10,20,H2O.ai support ,NA
+R_bKRGpG89T1Ow3xD,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_12,0,Other,NA
+R_31ozXURevz05RWH,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_1,0,Model fairness analysis and metrics,NA
+R_31ozXURevz05RWH,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_2,0,Supervised feature selection,NA
+R_31ozXURevz05RWH,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_3,0,Probability calibration (post modeling),NA
+R_31ozXURevz05RWH,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_4,0,Probability threshold optimization,NA
+R_31ozXURevz05RWH,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_5,100,Spatial analysis models and methods,NA
+R_31ozXURevz05RWH,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_6,0,Better serialization tools ,NA
+R_31ozXURevz05RWH,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_10,0,H2O.ai support ,NA
+R_31ozXURevz05RWH,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_12,0,Other,NA
+R_3oTMUjXG03zrdJ0,I have used tidymodels packages many times,I work in industry,Q5_1,20,Model fairness analysis and metrics,NA
+R_3oTMUjXG03zrdJ0,I have used tidymodels packages many times,I work in industry,Q5_2,10,Supervised feature selection,NA
+R_3oTMUjXG03zrdJ0,I have used tidymodels packages many times,I work in industry,Q5_3,20,Probability calibration (post modeling),NA
+R_3oTMUjXG03zrdJ0,I have used tidymodels packages many times,I work in industry,Q5_4,50,Probability threshold optimization,NA
+R_3oTMUjXG03zrdJ0,I have used tidymodels packages many times,I work in industry,Q5_5,0,Spatial analysis models and methods,NA
+R_3oTMUjXG03zrdJ0,I have used tidymodels packages many times,I work in industry,Q5_6,0,Better serialization tools ,NA
+R_3oTMUjXG03zrdJ0,I have used tidymodels packages many times,I work in industry,Q5_10,0,H2O.ai support ,NA
+R_3oTMUjXG03zrdJ0,I have used tidymodels packages many times,I work in industry,Q5_12,0,Other,NA
+R_1hXey5fRt2Qbloq,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_1,100,Model fairness analysis and metrics,NA
+R_1hXey5fRt2Qbloq,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_2,0,Supervised feature selection,NA
+R_1hXey5fRt2Qbloq,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_3,0,Probability calibration (post modeling),NA
+R_1hXey5fRt2Qbloq,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_4,0,Probability threshold optimization,NA
+R_1hXey5fRt2Qbloq,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_5,0,Spatial analysis models and methods,NA
+R_1hXey5fRt2Qbloq,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_6,0,Better serialization tools ,NA
+R_1hXey5fRt2Qbloq,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_10,0,H2O.ai support ,NA
+R_1hXey5fRt2Qbloq,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_12,0,Other,NA
+R_2Vkd9omnnViF36d,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_1,10,Model fairness analysis and metrics,NA
+R_2Vkd9omnnViF36d,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_2,0,Supervised feature selection,NA
+R_2Vkd9omnnViF36d,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_3,20,Probability calibration (post modeling),NA
+R_2Vkd9omnnViF36d,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_4,0,Probability threshold optimization,NA
+R_2Vkd9omnnViF36d,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_5,0,Spatial analysis models and methods,NA
+R_2Vkd9omnnViF36d,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_6,20,Better serialization tools ,NA
+R_2Vkd9omnnViF36d,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_10,0,H2O.ai support ,NA
+R_2Vkd9omnnViF36d,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_12,50,Other,More integration with Keras and Torch
+R_817EXm66FU8hArv,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_1,0,Model fairness analysis and metrics,NA
+R_817EXm66FU8hArv,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_2,25,Supervised feature selection,NA
+R_817EXm66FU8hArv,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_3,0,Probability calibration (post modeling),NA
+R_817EXm66FU8hArv,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_4,0,Probability threshold optimization,NA
+R_817EXm66FU8hArv,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_5,25,Spatial analysis models and methods,NA
+R_817EXm66FU8hArv,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_6,0,Better serialization tools ,NA
+R_817EXm66FU8hArv,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_10,0,H2O.ai support ,NA
+R_817EXm66FU8hArv,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_12,50,Other,Ability to handle multiply imputed datasets
+R_1jwH6FzPJAc1Zk4,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_1,0,Model fairness analysis and metrics,NA
+R_1jwH6FzPJAc1Zk4,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_2,0,Supervised feature selection,NA
+R_1jwH6FzPJAc1Zk4,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_3,0,Probability calibration (post modeling),NA
+R_1jwH6FzPJAc1Zk4,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_4,0,Probability threshold optimization,NA
+R_1jwH6FzPJAc1Zk4,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_5,0,Spatial analysis models and methods,NA
+R_1jwH6FzPJAc1Zk4,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_6,0,Better serialization tools ,NA
+R_1jwH6FzPJAc1Zk4,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_10,0,H2O.ai support ,NA
+R_1jwH6FzPJAc1Zk4,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_12,100,Other,Rewrite parsnip to be extensible and have good function names.
+R_7U8MqLN0GsL8jHb,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_1,0,Model fairness analysis and metrics,NA
+R_7U8MqLN0GsL8jHb,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_2,0,Supervised feature selection,NA
+R_7U8MqLN0GsL8jHb,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_3,0,Probability calibration (post modeling),NA
+R_7U8MqLN0GsL8jHb,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_4,0,Probability threshold optimization,NA
+R_7U8MqLN0GsL8jHb,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_5,0,Spatial analysis models and methods,NA
+R_7U8MqLN0GsL8jHb,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_6,0,Better serialization tools ,NA
+R_7U8MqLN0GsL8jHb,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_10,0,H2O.ai support ,NA
+R_7U8MqLN0GsL8jHb,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_12,100,Other,GPU support
+R_x3oco2HJKAddjy1,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_1,0,Model fairness analysis and metrics,NA
+R_x3oco2HJKAddjy1,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_2,10,Supervised feature selection,NA
+R_x3oco2HJKAddjy1,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_3,50,Probability calibration (post modeling),NA
+R_x3oco2HJKAddjy1,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_4,0,Probability threshold optimization,NA
+R_x3oco2HJKAddjy1,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_5,40,Spatial analysis models and methods,NA
+R_x3oco2HJKAddjy1,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_6,0,Better serialization tools ,NA
+R_x3oco2HJKAddjy1,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_10,0,H2O.ai support ,NA
+R_x3oco2HJKAddjy1,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_12,0,Other,NA
+R_1PZh85WRbAjhvDL,I have used tidymodels packages a few times,I work in industry,Q5_1,10,Model fairness analysis and metrics,NA
+R_1PZh85WRbAjhvDL,I have used tidymodels packages a few times,I work in industry,Q5_2,40,Supervised feature selection,NA
+R_1PZh85WRbAjhvDL,I have used tidymodels packages a few times,I work in industry,Q5_3,0,Probability calibration (post modeling),NA
+R_1PZh85WRbAjhvDL,I have used tidymodels packages a few times,I work in industry,Q5_4,0,Probability threshold optimization,NA
+R_1PZh85WRbAjhvDL,I have used tidymodels packages a few times,I work in industry,Q5_5,0,Spatial analysis models and methods,NA
+R_1PZh85WRbAjhvDL,I have used tidymodels packages a few times,I work in industry,Q5_6,10,Better serialization tools ,NA
+R_1PZh85WRbAjhvDL,I have used tidymodels packages a few times,I work in industry,Q5_10,40,H2O.ai support ,NA
+R_1PZh85WRbAjhvDL,I have used tidymodels packages a few times,I work in industry,Q5_12,0,Other,NA
+R_1mXaFZBU4llyJBH,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_1,20,Model fairness analysis and metrics,NA
+R_1mXaFZBU4llyJBH,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_2,0,Supervised feature selection,NA
+R_1mXaFZBU4llyJBH,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_3,50,Probability calibration (post modeling),NA
+R_1mXaFZBU4llyJBH,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_4,10,Probability threshold optimization,NA
+R_1mXaFZBU4llyJBH,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_5,10,Spatial analysis models and methods,NA
+R_1mXaFZBU4llyJBH,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_6,10,Better serialization tools ,NA
+R_1mXaFZBU4llyJBH,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_10,0,H2O.ai support ,NA
+R_1mXaFZBU4llyJBH,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_12,0,Other,NA
+R_2e841K7hgdumHIh,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_1,10,Model fairness analysis and metrics,NA
+R_2e841K7hgdumHIh,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_2,0,Supervised feature selection,NA
+R_2e841K7hgdumHIh,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_3,0,Probability calibration (post modeling),NA
+R_2e841K7hgdumHIh,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_4,10,Probability threshold optimization,NA
+R_2e841K7hgdumHIh,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_5,70,Spatial analysis models and methods,NA
+R_2e841K7hgdumHIh,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_6,10,Better serialization tools ,NA
+R_2e841K7hgdumHIh,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_10,0,H2O.ai support ,NA
+R_2e841K7hgdumHIh,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_12,0,Other,NA
+R_1mzqgXHROlAccjx,I have used tidymodels packages many times,I work in industry,Q5_1,0,Model fairness analysis and metrics,NA
+R_1mzqgXHROlAccjx,I have used tidymodels packages many times,I work in industry,Q5_2,50,Supervised feature selection,NA
+R_1mzqgXHROlAccjx,I have used tidymodels packages many times,I work in industry,Q5_3,20,Probability calibration (post modeling),NA
+R_1mzqgXHROlAccjx,I have used tidymodels packages many times,I work in industry,Q5_4,20,Probability threshold optimization,NA
+R_1mzqgXHROlAccjx,I have used tidymodels packages many times,I work in industry,Q5_5,10,Spatial analysis models and methods,NA
+R_1mzqgXHROlAccjx,I have used tidymodels packages many times,I work in industry,Q5_6,0,Better serialization tools ,NA
+R_1mzqgXHROlAccjx,I have used tidymodels packages many times,I work in industry,Q5_10,0,H2O.ai support ,NA
+R_1mzqgXHROlAccjx,I have used tidymodels packages many times,I work in industry,Q5_12,0,Other,NA
+R_1BRFOUCVpYOWs5C,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_1,50,Model fairness analysis and metrics,NA
+R_1BRFOUCVpYOWs5C,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_2,0,Supervised feature selection,NA
+R_1BRFOUCVpYOWs5C,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_3,0,Probability calibration (post modeling),NA
+R_1BRFOUCVpYOWs5C,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_4,0,Probability threshold optimization,NA
+R_1BRFOUCVpYOWs5C,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_5,50,Spatial analysis models and methods,NA
+R_1BRFOUCVpYOWs5C,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_6,0,Better serialization tools ,NA
+R_1BRFOUCVpYOWs5C,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_10,0,H2O.ai support ,NA
+R_1BRFOUCVpYOWs5C,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_12,0,Other,NA
+R_sM6hnawLDHp2inT,I have used tidymodels packages many times,I work in industry,Q5_1,0,Model fairness analysis and metrics,NA
+R_sM6hnawLDHp2inT,I have used tidymodels packages many times,I work in industry,Q5_2,0,Supervised feature selection,NA
+R_sM6hnawLDHp2inT,I have used tidymodels packages many times,I work in industry,Q5_3,0,Probability calibration (post modeling),NA
+R_sM6hnawLDHp2inT,I have used tidymodels packages many times,I work in industry,Q5_4,0,Probability threshold optimization,NA
+R_sM6hnawLDHp2inT,I have used tidymodels packages many times,I work in industry,Q5_5,0,Spatial analysis models and methods,NA
+R_sM6hnawLDHp2inT,I have used tidymodels packages many times,I work in industry,Q5_6,50,Better serialization tools ,NA
+R_sM6hnawLDHp2inT,I have used tidymodels packages many times,I work in industry,Q5_10,50,H2O.ai support ,NA
+R_sM6hnawLDHp2inT,I have used tidymodels packages many times,I work in industry,Q5_12,0,Other,NA
+R_3dKSHo59pbMVa0N,I have used tidymodels packages a few times,I work in industry,Q5_1,0,Model fairness analysis and metrics,NA
+R_3dKSHo59pbMVa0N,I have used tidymodels packages a few times,I work in industry,Q5_2,0,Supervised feature selection,NA
+R_3dKSHo59pbMVa0N,I have used tidymodels packages a few times,I work in industry,Q5_3,5,Probability calibration (post modeling),NA
+R_3dKSHo59pbMVa0N,I have used tidymodels packages a few times,I work in industry,Q5_4,20,Probability threshold optimization,NA
+R_3dKSHo59pbMVa0N,I have used tidymodels packages a few times,I work in industry,Q5_5,50,Spatial analysis models and methods,NA
+R_3dKSHo59pbMVa0N,I have used tidymodels packages a few times,I work in industry,Q5_6,20,Better serialization tools ,NA
+R_3dKSHo59pbMVa0N,I have used tidymodels packages a few times,I work in industry,Q5_10,5,H2O.ai support ,NA
+R_3dKSHo59pbMVa0N,I have used tidymodels packages a few times,I work in industry,Q5_12,0,Other,NA
+R_3QGd2Ri7yZnDTaG,I have used tidymodels packages a few times,I work in industry,Q5_1,30,Model fairness analysis and metrics,NA
+R_3QGd2Ri7yZnDTaG,I have used tidymodels packages a few times,I work in industry,Q5_2,30,Supervised feature selection,NA
+R_3QGd2Ri7yZnDTaG,I have used tidymodels packages a few times,I work in industry,Q5_3,10,Probability calibration (post modeling),NA
+R_3QGd2Ri7yZnDTaG,I have used tidymodels packages a few times,I work in industry,Q5_4,0,Probability threshold optimization,NA
+R_3QGd2Ri7yZnDTaG,I have used tidymodels packages a few times,I work in industry,Q5_5,0,Spatial analysis models and methods,NA
+R_3QGd2Ri7yZnDTaG,I have used tidymodels packages a few times,I work in industry,Q5_6,0,Better serialization tools ,NA
+R_3QGd2Ri7yZnDTaG,I have used tidymodels packages a few times,I work in industry,Q5_10,0,H2O.ai support ,NA
+R_3QGd2Ri7yZnDTaG,I have used tidymodels packages a few times,I work in industry,Q5_12,30,Other,sparkxgb integration
+R_DBIn9Ohel4HdOnf,I have used tidymodels packages a few times,I work in industry,Q5_1,5,Model fairness analysis and metrics,NA
+R_DBIn9Ohel4HdOnf,I have used tidymodels packages a few times,I work in industry,Q5_2,20,Supervised feature selection,NA
+R_DBIn9Ohel4HdOnf,I have used tidymodels packages a few times,I work in industry,Q5_3,25,Probability calibration (post modeling),NA
+R_DBIn9Ohel4HdOnf,I have used tidymodels packages a few times,I work in industry,Q5_4,30,Probability threshold optimization,NA
+R_DBIn9Ohel4HdOnf,I have used tidymodels packages a few times,I work in industry,Q5_5,0,Spatial analysis models and methods,NA
+R_DBIn9Ohel4HdOnf,I have used tidymodels packages a few times,I work in industry,Q5_6,20,Better serialization tools ,NA
+R_DBIn9Ohel4HdOnf,I have used tidymodels packages a few times,I work in industry,Q5_10,0,H2O.ai support ,NA
+R_DBIn9Ohel4HdOnf,I have used tidymodels packages a few times,I work in industry,Q5_12,0,Other,NA
+R_10T79GPcNUbJQHL,I have used tidymodels packages a few times,I work in industry,Q5_1,5,Model fairness analysis and metrics,NA
+R_10T79GPcNUbJQHL,I have used tidymodels packages a few times,I work in industry,Q5_2,5,Supervised feature selection,NA
+R_10T79GPcNUbJQHL,I have used tidymodels packages a few times,I work in industry,Q5_3,5,Probability calibration (post modeling),NA
+R_10T79GPcNUbJQHL,I have used tidymodels packages a few times,I work in industry,Q5_4,0,Probability threshold optimization,NA
+R_10T79GPcNUbJQHL,I have used tidymodels packages a few times,I work in industry,Q5_5,5,Spatial analysis models and methods,NA
+R_10T79GPcNUbJQHL,I have used tidymodels packages a few times,I work in industry,Q5_6,5,Better serialization tools ,NA
+R_10T79GPcNUbJQHL,I have used tidymodels packages a few times,I work in industry,Q5_10,75,H2O.ai support ,NA
+R_10T79GPcNUbJQHL,I have used tidymodels packages a few times,I work in industry,Q5_12,0,Other,NA
+R_1gTMgkbLLvWKBtW,I have used tidymodels packages a few times,I work in industry,Q5_1,30,Model fairness analysis and metrics,NA
+R_1gTMgkbLLvWKBtW,I have used tidymodels packages a few times,I work in industry,Q5_2,20,Supervised feature selection,NA
+R_1gTMgkbLLvWKBtW,I have used tidymodels packages a few times,I work in industry,Q5_3,30,Probability calibration (post modeling),NA
+R_1gTMgkbLLvWKBtW,I have used tidymodels packages a few times,I work in industry,Q5_4,20,Probability threshold optimization,NA
+R_1gTMgkbLLvWKBtW,I have used tidymodels packages a few times,I work in industry,Q5_5,0,Spatial analysis models and methods,NA
+R_1gTMgkbLLvWKBtW,I have used tidymodels packages a few times,I work in industry,Q5_6,0,Better serialization tools ,NA
+R_1gTMgkbLLvWKBtW,I have used tidymodels packages a few times,I work in industry,Q5_10,0,H2O.ai support ,NA
+R_1gTMgkbLLvWKBtW,I have used tidymodels packages a few times,I work in industry,Q5_12,0,Other,NA
+R_0iJBxgHQemC5J7j,I have used tidymodels packages many times,I am a student,Q5_1,0,Model fairness analysis and metrics,NA
+R_0iJBxgHQemC5J7j,I have used tidymodels packages many times,I am a student,Q5_2,0,Supervised feature selection,NA
+R_0iJBxgHQemC5J7j,I have used tidymodels packages many times,I am a student,Q5_3,0,Probability calibration (post modeling),NA
+R_0iJBxgHQemC5J7j,I have used tidymodels packages many times,I am a student,Q5_4,0,Probability threshold optimization,NA
+R_0iJBxgHQemC5J7j,I have used tidymodels packages many times,I am a student,Q5_5,20,Spatial analysis models and methods,NA
+R_0iJBxgHQemC5J7j,I have used tidymodels packages many times,I am a student,Q5_6,50,Better serialization tools ,NA
+R_0iJBxgHQemC5J7j,I have used tidymodels packages many times,I am a student,Q5_10,30,H2O.ai support ,NA
+R_0iJBxgHQemC5J7j,I have used tidymodels packages many times,I am a student,Q5_12,0,Other,NA
+R_241PlOmTeziatGP,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_1,25,Model fairness analysis and metrics,NA
+R_241PlOmTeziatGP,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_2,15,Supervised feature selection,NA
+R_241PlOmTeziatGP,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_3,5,Probability calibration (post modeling),NA
+R_241PlOmTeziatGP,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_4,5,Probability threshold optimization,NA
+R_241PlOmTeziatGP,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_5,0,Spatial analysis models and methods,NA
+R_241PlOmTeziatGP,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_6,10,Better serialization tools ,NA
+R_241PlOmTeziatGP,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_10,40,H2O.ai support ,NA
+R_241PlOmTeziatGP,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_12,0,Other,NA
+R_SH9hsSPyLKYZfqh,I have never used tidymodels,I work in industry,Q5_1,0,Model fairness analysis and metrics,NA
+R_SH9hsSPyLKYZfqh,I have never used tidymodels,I work in industry,Q5_2,25,Supervised feature selection,NA
+R_SH9hsSPyLKYZfqh,I have never used tidymodels,I work in industry,Q5_3,0,Probability calibration (post modeling),NA
+R_SH9hsSPyLKYZfqh,I have never used tidymodels,I work in industry,Q5_4,0,Probability threshold optimization,NA
+R_SH9hsSPyLKYZfqh,I have never used tidymodels,I work in industry,Q5_5,0,Spatial analysis models and methods,NA
+R_SH9hsSPyLKYZfqh,I have never used tidymodels,I work in industry,Q5_6,0,Better serialization tools ,NA
+R_SH9hsSPyLKYZfqh,I have never used tidymodels,I work in industry,Q5_10,75,H2O.ai support ,NA
+R_SH9hsSPyLKYZfqh,I have never used tidymodels,I work in industry,Q5_12,0,Other,NA
+R_XAhfeqWm8gmVvm9,I have never used tidymodels,I work in industry,Q5_1,0,Model fairness analysis and metrics,NA
+R_XAhfeqWm8gmVvm9,I have never used tidymodels,I work in industry,Q5_2,0,Supervised feature selection,NA
+R_XAhfeqWm8gmVvm9,I have never used tidymodels,I work in industry,Q5_3,0,Probability calibration (post modeling),NA
+R_XAhfeqWm8gmVvm9,I have never used tidymodels,I work in industry,Q5_4,0,Probability threshold optimization,NA
+R_XAhfeqWm8gmVvm9,I have never used tidymodels,I work in industry,Q5_5,0,Spatial analysis models and methods,NA
+R_XAhfeqWm8gmVvm9,I have never used tidymodels,I work in industry,Q5_6,0,Better serialization tools ,NA
+R_XAhfeqWm8gmVvm9,I have never used tidymodels,I work in industry,Q5_10,100,H2O.ai support ,NA
+R_XAhfeqWm8gmVvm9,I have never used tidymodels,I work in industry,Q5_12,0,Other,NA
+R_3K61sjf9T0n8VBD,I have used tidymodels packages many times,I work in industry,Q5_1,5,Model fairness analysis and metrics,NA
+R_3K61sjf9T0n8VBD,I have used tidymodels packages many times,I work in industry,Q5_2,10,Supervised feature selection,NA
+R_3K61sjf9T0n8VBD,I have used tidymodels packages many times,I work in industry,Q5_3,5,Probability calibration (post modeling),NA
+R_3K61sjf9T0n8VBD,I have used tidymodels packages many times,I work in industry,Q5_4,0,Probability threshold optimization,NA
+R_3K61sjf9T0n8VBD,I have used tidymodels packages many times,I work in industry,Q5_5,0,Spatial analysis models and methods,NA
+R_3K61sjf9T0n8VBD,I have used tidymodels packages many times,I work in industry,Q5_6,0,Better serialization tools ,NA
+R_3K61sjf9T0n8VBD,I have used tidymodels packages many times,I work in industry,Q5_10,80,H2O.ai support ,NA
+R_3K61sjf9T0n8VBD,I have used tidymodels packages many times,I work in industry,Q5_12,0,Other,NA
+R_3RrSKedseVmLcKj,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_1,10,Model fairness analysis and metrics,NA
+R_3RrSKedseVmLcKj,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_2,30,Supervised feature selection,NA
+R_3RrSKedseVmLcKj,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_3,10,Probability calibration (post modeling),NA
+R_3RrSKedseVmLcKj,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_4,10,Probability threshold optimization,NA
+R_3RrSKedseVmLcKj,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_5,0,Spatial analysis models and methods,NA
+R_3RrSKedseVmLcKj,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_6,10,Better serialization tools ,NA
+R_3RrSKedseVmLcKj,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_10,30,H2O.ai support ,NA
+R_3RrSKedseVmLcKj,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_12,0,Other,NA
+R_3G26iyL8bV7s4G9,I have used tidymodels packages a few times,I work in industry,Q5_1,30,Model fairness analysis and metrics,NA
+R_3G26iyL8bV7s4G9,I have used tidymodels packages a few times,I work in industry,Q5_2,5,Supervised feature selection,NA
+R_3G26iyL8bV7s4G9,I have used tidymodels packages a few times,I work in industry,Q5_3,25,Probability calibration (post modeling),NA
+R_3G26iyL8bV7s4G9,I have used tidymodels packages a few times,I work in industry,Q5_4,25,Probability threshold optimization,NA
+R_3G26iyL8bV7s4G9,I have used tidymodels packages a few times,I work in industry,Q5_5,0,Spatial analysis models and methods,NA
+R_3G26iyL8bV7s4G9,I have used tidymodels packages a few times,I work in industry,Q5_6,0,Better serialization tools ,NA
+R_3G26iyL8bV7s4G9,I have used tidymodels packages a few times,I work in industry,Q5_10,5,H2O.ai support ,NA
+R_3G26iyL8bV7s4G9,I have used tidymodels packages a few times,I work in industry,Q5_12,10,Other,SMOTE
+R_24JisJMEk59a1FJ,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_1,0,Model fairness analysis and metrics,NA
+R_24JisJMEk59a1FJ,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_2,0,Supervised feature selection,NA
+R_24JisJMEk59a1FJ,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_3,0,Probability calibration (post modeling),NA
+R_24JisJMEk59a1FJ,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_4,0,Probability threshold optimization,NA
+R_24JisJMEk59a1FJ,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_5,0,Spatial analysis models and methods,NA
+R_24JisJMEk59a1FJ,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_6,0,Better serialization tools ,NA
+R_24JisJMEk59a1FJ,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_10,0,H2O.ai support ,NA
+R_24JisJMEk59a1FJ,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_12,100,Other,"More convenient functions, requiring less typing. And documentation about sensible values for algorithm arguments such as mlp()"
+R_xo1rIebQ0PqR3UZ,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_1,30,Model fairness analysis and metrics,NA
+R_xo1rIebQ0PqR3UZ,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_2,30,Supervised feature selection,NA
+R_xo1rIebQ0PqR3UZ,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_3,0,Probability calibration (post modeling),NA
+R_xo1rIebQ0PqR3UZ,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_4,40,Probability threshold optimization,NA
+R_xo1rIebQ0PqR3UZ,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_5,0,Spatial analysis models and methods,NA
+R_xo1rIebQ0PqR3UZ,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_6,0,Better serialization tools ,NA
+R_xo1rIebQ0PqR3UZ,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_10,0,H2O.ai support ,NA
+R_xo1rIebQ0PqR3UZ,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_12,0,Other,NA
+R_3hhaQP1NTZyyvrq,I have used tidymodels packages many times,I am a student,Q5_1,5,Model fairness analysis and metrics,NA
+R_3hhaQP1NTZyyvrq,I have used tidymodels packages many times,I am a student,Q5_2,15,Supervised feature selection,NA
+R_3hhaQP1NTZyyvrq,I have used tidymodels packages many times,I am a student,Q5_3,15,Probability calibration (post modeling),NA
+R_3hhaQP1NTZyyvrq,I have used tidymodels packages many times,I am a student,Q5_4,0,Probability threshold optimization,NA
+R_3hhaQP1NTZyyvrq,I have used tidymodels packages many times,I am a student,Q5_5,20,Spatial analysis models and methods,NA
+R_3hhaQP1NTZyyvrq,I have used tidymodels packages many times,I am a student,Q5_6,20,Better serialization tools ,NA
+R_3hhaQP1NTZyyvrq,I have used tidymodels packages many times,I am a student,Q5_10,10,H2O.ai support ,NA
+R_3hhaQP1NTZyyvrq,I have used tidymodels packages many times,I am a student,Q5_12,15,Other,Synchronization of Tidymodels with DALEX Model Exploration package
+R_722j3EceZJJbBYZ,I have used tidymodels packages a few times,I work in industry,Q5_1,0,Model fairness analysis and metrics,NA
+R_722j3EceZJJbBYZ,I have used tidymodels packages a few times,I work in industry,Q5_2,15,Supervised feature selection,NA
+R_722j3EceZJJbBYZ,I have used tidymodels packages a few times,I work in industry,Q5_3,0,Probability calibration (post modeling),NA
+R_722j3EceZJJbBYZ,I have used tidymodels packages a few times,I work in industry,Q5_4,0,Probability threshold optimization,NA
+R_722j3EceZJJbBYZ,I have used tidymodels packages a few times,I work in industry,Q5_5,10,Spatial analysis models and methods,NA
+R_722j3EceZJJbBYZ,I have used tidymodels packages a few times,I work in industry,Q5_6,0,Better serialization tools ,NA
+R_722j3EceZJJbBYZ,I have used tidymodels packages a few times,I work in industry,Q5_10,75,H2O.ai support ,NA
+R_722j3EceZJJbBYZ,I have used tidymodels packages a few times,I work in industry,Q5_12,0,Other,NA
+R_1PbYMTLkZEWtJQ8,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_1,10,Model fairness analysis and metrics,NA
+R_1PbYMTLkZEWtJQ8,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_2,10,Supervised feature selection,NA
+R_1PbYMTLkZEWtJQ8,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_3,20,Probability calibration (post modeling),NA
+R_1PbYMTLkZEWtJQ8,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_4,5,Probability threshold optimization,NA
+R_1PbYMTLkZEWtJQ8,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_5,5,Spatial analysis models and methods,NA
+R_1PbYMTLkZEWtJQ8,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_6,20,Better serialization tools ,NA
+R_1PbYMTLkZEWtJQ8,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_10,20,H2O.ai support ,NA
+R_1PbYMTLkZEWtJQ8,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_12,10,Other,Inter-operate with mlr3 objects
+R_1JDvrduIJd1Pf0x,I have used tidymodels packages many times,I work in industry,Q5_1,10,Model fairness analysis and metrics,NA
+R_1JDvrduIJd1Pf0x,I have used tidymodels packages many times,I work in industry,Q5_2,20,Supervised feature selection,NA
+R_1JDvrduIJd1Pf0x,I have used tidymodels packages many times,I work in industry,Q5_3,7,Probability calibration (post modeling),NA
+R_1JDvrduIJd1Pf0x,I have used tidymodels packages many times,I work in industry,Q5_4,10,Probability threshold optimization,NA
+R_1JDvrduIJd1Pf0x,I have used tidymodels packages many times,I work in industry,Q5_5,0,Spatial analysis models and methods,NA
+R_1JDvrduIJd1Pf0x,I have used tidymodels packages many times,I work in industry,Q5_6,20,Better serialization tools ,NA
+R_1JDvrduIJd1Pf0x,I have used tidymodels packages many times,I work in industry,Q5_10,0,H2O.ai support ,NA
+R_1JDvrduIJd1Pf0x,I have used tidymodels packages many times,I work in industry,Q5_12,33,Other,Time series models
+R_29fRhg51hlol09d,I have used tidymodels packages many times,I work in industry,Q5_1,20,Model fairness analysis and metrics,NA
+R_29fRhg51hlol09d,I have used tidymodels packages many times,I work in industry,Q5_2,10,Supervised feature selection,NA
+R_29fRhg51hlol09d,I have used tidymodels packages many times,I work in industry,Q5_3,10,Probability calibration (post modeling),NA
+R_29fRhg51hlol09d,I have used tidymodels packages many times,I work in industry,Q5_4,0,Probability threshold optimization,NA
+R_29fRhg51hlol09d,I have used tidymodels packages many times,I work in industry,Q5_5,50,Spatial analysis models and methods,NA
+R_29fRhg51hlol09d,I have used tidymodels packages many times,I work in industry,Q5_6,10,Better serialization tools ,NA
+R_29fRhg51hlol09d,I have used tidymodels packages many times,I work in industry,Q5_10,0,H2O.ai support ,NA
+R_29fRhg51hlol09d,I have used tidymodels packages many times,I work in industry,Q5_12,0,Other,NA
+R_ugAXVugLOiJnOfL,I have used tidymodels packages a few times,I work in industry,Q5_1,0,Model fairness analysis and metrics,NA
+R_ugAXVugLOiJnOfL,I have used tidymodels packages a few times,I work in industry,Q5_2,100,Supervised feature selection,NA
+R_ugAXVugLOiJnOfL,I have used tidymodels packages a few times,I work in industry,Q5_3,0,Probability calibration (post modeling),NA
+R_ugAXVugLOiJnOfL,I have used tidymodels packages a few times,I work in industry,Q5_4,0,Probability threshold optimization,NA
+R_ugAXVugLOiJnOfL,I have used tidymodels packages a few times,I work in industry,Q5_5,0,Spatial analysis models and methods,NA
+R_ugAXVugLOiJnOfL,I have used tidymodels packages a few times,I work in industry,Q5_6,0,Better serialization tools ,NA
+R_ugAXVugLOiJnOfL,I have used tidymodels packages a few times,I work in industry,Q5_10,0,H2O.ai support ,NA
+R_ugAXVugLOiJnOfL,I have used tidymodels packages a few times,I work in industry,Q5_12,0,Other,NA
+R_2ymHAqCGZzrHRT6,I have used tidymodels packages many times,I work in industry,Q5_1,30,Model fairness analysis and metrics,NA
+R_2ymHAqCGZzrHRT6,I have used tidymodels packages many times,I work in industry,Q5_2,10,Supervised feature selection,NA
+R_2ymHAqCGZzrHRT6,I have used tidymodels packages many times,I work in industry,Q5_3,30,Probability calibration (post modeling),NA
+R_2ymHAqCGZzrHRT6,I have used tidymodels packages many times,I work in industry,Q5_4,20,Probability threshold optimization,NA
+R_2ymHAqCGZzrHRT6,I have used tidymodels packages many times,I work in industry,Q5_5,0,Spatial analysis models and methods,NA
+R_2ymHAqCGZzrHRT6,I have used tidymodels packages many times,I work in industry,Q5_6,10,Better serialization tools ,NA
+R_2ymHAqCGZzrHRT6,I have used tidymodels packages many times,I work in industry,Q5_10,0,H2O.ai support ,NA
+R_2ymHAqCGZzrHRT6,I have used tidymodels packages many times,I work in industry,Q5_12,0,Other,NA
+R_2TFYoTPiwXcOLSU,I have used tidymodels packages many times,I work in industry,Q5_1,10,Model fairness analysis and metrics,NA
+R_2TFYoTPiwXcOLSU,I have used tidymodels packages many times,I work in industry,Q5_2,10,Supervised feature selection,NA
+R_2TFYoTPiwXcOLSU,I have used tidymodels packages many times,I work in industry,Q5_3,0,Probability calibration (post modeling),NA
+R_2TFYoTPiwXcOLSU,I have used tidymodels packages many times,I work in industry,Q5_4,20,Probability threshold optimization,NA
+R_2TFYoTPiwXcOLSU,I have used tidymodels packages many times,I work in industry,Q5_5,0,Spatial analysis models and methods,NA
+R_2TFYoTPiwXcOLSU,I have used tidymodels packages many times,I work in industry,Q5_6,0,Better serialization tools ,NA
+R_2TFYoTPiwXcOLSU,I have used tidymodels packages many times,I work in industry,Q5_10,30,H2O.ai support ,NA
+R_2TFYoTPiwXcOLSU,I have used tidymodels packages many times,I work in industry,Q5_12,30,Other,multilabel classification
+R_1P6QD5vZBCyVTra,I have used tidymodels packages a few times,I work in industry,Q5_1,20,Model fairness analysis and metrics,NA
+R_1P6QD5vZBCyVTra,I have used tidymodels packages a few times,I work in industry,Q5_2,20,Supervised feature selection,NA
+R_1P6QD5vZBCyVTra,I have used tidymodels packages a few times,I work in industry,Q5_3,10,Probability calibration (post modeling),NA
+R_1P6QD5vZBCyVTra,I have used tidymodels packages a few times,I work in industry,Q5_4,20,Probability threshold optimization,NA
+R_1P6QD5vZBCyVTra,I have used tidymodels packages a few times,I work in industry,Q5_5,10,Spatial analysis models and methods,NA
+R_1P6QD5vZBCyVTra,I have used tidymodels packages a few times,I work in industry,Q5_6,10,Better serialization tools ,NA
+R_1P6QD5vZBCyVTra,I have used tidymodels packages a few times,I work in industry,Q5_10,10,H2O.ai support ,NA
+R_1P6QD5vZBCyVTra,I have used tidymodels packages a few times,I work in industry,Q5_12,0,Other,NA
+R_2bP1NDUpStpnpWw,I have contributed to tidymodels packages or taught others how to use them,"I am an academic, professor, and/or researcher",Q5_1,0,Model fairness analysis and metrics,NA
+R_2bP1NDUpStpnpWw,I have contributed to tidymodels packages or taught others how to use them,"I am an academic, professor, and/or researcher",Q5_2,30,Supervised feature selection,NA
+R_2bP1NDUpStpnpWw,I have contributed to tidymodels packages or taught others how to use them,"I am an academic, professor, and/or researcher",Q5_3,0,Probability calibration (post modeling),NA
+R_2bP1NDUpStpnpWw,I have contributed to tidymodels packages or taught others how to use them,"I am an academic, professor, and/or researcher",Q5_4,20,Probability threshold optimization,NA
+R_2bP1NDUpStpnpWw,I have contributed to tidymodels packages or taught others how to use them,"I am an academic, professor, and/or researcher",Q5_5,0,Spatial analysis models and methods,NA
+R_2bP1NDUpStpnpWw,I have contributed to tidymodels packages or taught others how to use them,"I am an academic, professor, and/or researcher",Q5_6,50,Better serialization tools ,NA
+R_2bP1NDUpStpnpWw,I have contributed to tidymodels packages or taught others how to use them,"I am an academic, professor, and/or researcher",Q5_10,0,H2O.ai support ,NA
+R_2bP1NDUpStpnpWw,I have contributed to tidymodels packages or taught others how to use them,"I am an academic, professor, and/or researcher",Q5_12,0,Other,NA
+R_3G3BGCZ8TbE2Xeb,I have used tidymodels packages many times,I work in industry,Q5_1,35,Model fairness analysis and metrics,NA
+R_3G3BGCZ8TbE2Xeb,I have used tidymodels packages many times,I work in industry,Q5_2,45,Supervised feature selection,NA
+R_3G3BGCZ8TbE2Xeb,I have used tidymodels packages many times,I work in industry,Q5_3,0,Probability calibration (post modeling),NA
+R_3G3BGCZ8TbE2Xeb,I have used tidymodels packages many times,I work in industry,Q5_4,10,Probability threshold optimization,NA
+R_3G3BGCZ8TbE2Xeb,I have used tidymodels packages many times,I work in industry,Q5_5,0,Spatial analysis models and methods,NA
+R_3G3BGCZ8TbE2Xeb,I have used tidymodels packages many times,I work in industry,Q5_6,0,Better serialization tools ,NA
+R_3G3BGCZ8TbE2Xeb,I have used tidymodels packages many times,I work in industry,Q5_10,10,H2O.ai support ,NA
+R_3G3BGCZ8TbE2Xeb,I have used tidymodels packages many times,I work in industry,Q5_12,0,Other,NA
+R_SOunucKSA04HmWB,I have used tidymodels packages a few times,I work in industry,Q5_1,15,Model fairness analysis and metrics,NA
+R_SOunucKSA04HmWB,I have used tidymodels packages a few times,I work in industry,Q5_2,30,Supervised feature selection,NA
+R_SOunucKSA04HmWB,I have used tidymodels packages a few times,I work in industry,Q5_3,0,Probability calibration (post modeling),NA
+R_SOunucKSA04HmWB,I have used tidymodels packages a few times,I work in industry,Q5_4,0,Probability threshold optimization,NA
+R_SOunucKSA04HmWB,I have used tidymodels packages a few times,I work in industry,Q5_5,40,Spatial analysis models and methods,NA
+R_SOunucKSA04HmWB,I have used tidymodels packages a few times,I work in industry,Q5_6,0,Better serialization tools ,NA
+R_SOunucKSA04HmWB,I have used tidymodels packages a few times,I work in industry,Q5_10,15,H2O.ai support ,NA
+R_SOunucKSA04HmWB,I have used tidymodels packages a few times,I work in industry,Q5_12,0,Other,NA
+R_yjs6RxV04aD6Gs1,I have used tidymodels packages many times,I work in industry,Q5_1,0,Model fairness analysis and metrics,NA
+R_yjs6RxV04aD6Gs1,I have used tidymodels packages many times,I work in industry,Q5_2,40,Supervised feature selection,NA
+R_yjs6RxV04aD6Gs1,I have used tidymodels packages many times,I work in industry,Q5_3,30,Probability calibration (post modeling),NA
+R_yjs6RxV04aD6Gs1,I have used tidymodels packages many times,I work in industry,Q5_4,0,Probability threshold optimization,NA
+R_yjs6RxV04aD6Gs1,I have used tidymodels packages many times,I work in industry,Q5_5,0,Spatial analysis models and methods,NA
+R_yjs6RxV04aD6Gs1,I have used tidymodels packages many times,I work in industry,Q5_6,10,Better serialization tools ,NA
+R_yjs6RxV04aD6Gs1,I have used tidymodels packages many times,I work in industry,Q5_10,20,H2O.ai support ,NA
+R_yjs6RxV04aD6Gs1,I have used tidymodels packages many times,I work in industry,Q5_12,0,Other,NA
+R_6mbWCaZURhdt1GV,I have used tidymodels packages a few times,I am a student,Q5_1,0,Model fairness analysis and metrics,NA
+R_6mbWCaZURhdt1GV,I have used tidymodels packages a few times,I am a student,Q5_2,50,Supervised feature selection,NA
+R_6mbWCaZURhdt1GV,I have used tidymodels packages a few times,I am a student,Q5_3,0,Probability calibration (post modeling),NA
+R_6mbWCaZURhdt1GV,I have used tidymodels packages a few times,I am a student,Q5_4,0,Probability threshold optimization,NA
+R_6mbWCaZURhdt1GV,I have used tidymodels packages a few times,I am a student,Q5_5,0,Spatial analysis models and methods,NA
+R_6mbWCaZURhdt1GV,I have used tidymodels packages a few times,I am a student,Q5_6,0,Better serialization tools ,NA
+R_6mbWCaZURhdt1GV,I have used tidymodels packages a few times,I am a student,Q5_10,0,H2O.ai support ,NA
+R_6mbWCaZURhdt1GV,I have used tidymodels packages a few times,I am a student,Q5_12,50,Other,nested cross validation with tune
+R_u56uSTpVKhh5i9P,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_1,0,Model fairness analysis and metrics,NA
+R_u56uSTpVKhh5i9P,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_2,50,Supervised feature selection,NA
+R_u56uSTpVKhh5i9P,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_3,0,Probability calibration (post modeling),NA
+R_u56uSTpVKhh5i9P,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_4,0,Probability threshold optimization,NA
+R_u56uSTpVKhh5i9P,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_5,0,Spatial analysis models and methods,NA
+R_u56uSTpVKhh5i9P,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_6,0,Better serialization tools ,NA
+R_u56uSTpVKhh5i9P,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_10,50,H2O.ai support ,NA
+R_u56uSTpVKhh5i9P,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_12,0,Other,NA
+R_85IlC1gMsqNCj6h,I have used tidymodels packages many times,I work in industry,Q5_1,0,Model fairness analysis and metrics,NA
+R_85IlC1gMsqNCj6h,I have used tidymodels packages many times,I work in industry,Q5_2,10,Supervised feature selection,NA
+R_85IlC1gMsqNCj6h,I have used tidymodels packages many times,I work in industry,Q5_3,10,Probability calibration (post modeling),NA
+R_85IlC1gMsqNCj6h,I have used tidymodels packages many times,I work in industry,Q5_4,0,Probability threshold optimization,NA
+R_85IlC1gMsqNCj6h,I have used tidymodels packages many times,I work in industry,Q5_5,5,Spatial analysis models and methods,NA
+R_85IlC1gMsqNCj6h,I have used tidymodels packages many times,I work in industry,Q5_6,0,Better serialization tools ,NA
+R_85IlC1gMsqNCj6h,I have used tidymodels packages many times,I work in industry,Q5_10,75,H2O.ai support ,NA
+R_85IlC1gMsqNCj6h,I have used tidymodels packages many times,I work in industry,Q5_12,0,Other,NA
+R_2roQP8muwwUg3Jf,I have used tidymodels packages many times,I work in industry,Q5_1,0,Model fairness analysis and metrics,NA
+R_2roQP8muwwUg3Jf,I have used tidymodels packages many times,I work in industry,Q5_2,20,Supervised feature selection,NA
+R_2roQP8muwwUg3Jf,I have used tidymodels packages many times,I work in industry,Q5_3,20,Probability calibration (post modeling),NA
+R_2roQP8muwwUg3Jf,I have used tidymodels packages many times,I work in industry,Q5_4,0,Probability threshold optimization,NA
+R_2roQP8muwwUg3Jf,I have used tidymodels packages many times,I work in industry,Q5_5,0,Spatial analysis models and methods,NA
+R_2roQP8muwwUg3Jf,I have used tidymodels packages many times,I work in industry,Q5_6,20,Better serialization tools ,NA
+R_2roQP8muwwUg3Jf,I have used tidymodels packages many times,I work in industry,Q5_10,20,H2O.ai support ,NA
+R_2roQP8muwwUg3Jf,I have used tidymodels packages many times,I work in industry,Q5_12,20,Other,GPU acceleration
+R_1mq1DIO3GoTwOPJ,I have used tidymodels packages a few times,I am a hobbyist,Q5_1,0,Model fairness analysis and metrics,NA
+R_1mq1DIO3GoTwOPJ,I have used tidymodels packages a few times,I am a hobbyist,Q5_2,50,Supervised feature selection,NA
+R_1mq1DIO3GoTwOPJ,I have used tidymodels packages a few times,I am a hobbyist,Q5_3,25,Probability calibration (post modeling),NA
+R_1mq1DIO3GoTwOPJ,I have used tidymodels packages a few times,I am a hobbyist,Q5_4,25,Probability threshold optimization,NA
+R_1mq1DIO3GoTwOPJ,I have used tidymodels packages a few times,I am a hobbyist,Q5_5,0,Spatial analysis models and methods,NA
+R_1mq1DIO3GoTwOPJ,I have used tidymodels packages a few times,I am a hobbyist,Q5_6,0,Better serialization tools ,NA
+R_1mq1DIO3GoTwOPJ,I have used tidymodels packages a few times,I am a hobbyist,Q5_10,0,H2O.ai support ,NA
+R_1mq1DIO3GoTwOPJ,I have used tidymodels packages a few times,I am a hobbyist,Q5_12,0,Other,NA
+R_3PB0mWfvHHOLYwZ,I have used tidymodels packages many times,I work in industry,Q5_1,0,Model fairness analysis and metrics,NA
+R_3PB0mWfvHHOLYwZ,I have used tidymodels packages many times,I work in industry,Q5_2,5,Supervised feature selection,NA
+R_3PB0mWfvHHOLYwZ,I have used tidymodels packages many times,I work in industry,Q5_3,5,Probability calibration (post modeling),NA
+R_3PB0mWfvHHOLYwZ,I have used tidymodels packages many times,I work in industry,Q5_4,5,Probability threshold optimization,NA
+R_3PB0mWfvHHOLYwZ,I have used tidymodels packages many times,I work in industry,Q5_5,5,Spatial analysis models and methods,NA
+R_3PB0mWfvHHOLYwZ,I have used tidymodels packages many times,I work in industry,Q5_6,5,Better serialization tools ,NA
+R_3PB0mWfvHHOLYwZ,I have used tidymodels packages many times,I work in industry,Q5_10,75,H2O.ai support ,NA
+R_3PB0mWfvHHOLYwZ,I have used tidymodels packages many times,I work in industry,Q5_12,0,Other,NA
+R_1FwXjYKR5FL4IRZ,I have used tidymodels packages many times,I work in industry,Q5_1,0,Model fairness analysis and metrics,NA
+R_1FwXjYKR5FL4IRZ,I have used tidymodels packages many times,I work in industry,Q5_2,33,Supervised feature selection,NA
+R_1FwXjYKR5FL4IRZ,I have used tidymodels packages many times,I work in industry,Q5_3,33,Probability calibration (post modeling),NA
+R_1FwXjYKR5FL4IRZ,I have used tidymodels packages many times,I work in industry,Q5_4,33,Probability threshold optimization,NA
+R_1FwXjYKR5FL4IRZ,I have used tidymodels packages many times,I work in industry,Q5_5,1,Spatial analysis models and methods,NA
+R_1FwXjYKR5FL4IRZ,I have used tidymodels packages many times,I work in industry,Q5_6,0,Better serialization tools ,NA
+R_1FwXjYKR5FL4IRZ,I have used tidymodels packages many times,I work in industry,Q5_10,0,H2O.ai support ,NA
+R_1FwXjYKR5FL4IRZ,I have used tidymodels packages many times,I work in industry,Q5_12,0,Other,NA
+R_2rHg5lrVXmLOBdK,I have used tidymodels packages many times,I work in industry,Q5_1,25,Model fairness analysis and metrics,NA
+R_2rHg5lrVXmLOBdK,I have used tidymodels packages many times,I work in industry,Q5_2,25,Supervised feature selection,NA
+R_2rHg5lrVXmLOBdK,I have used tidymodels packages many times,I work in industry,Q5_3,0,Probability calibration (post modeling),NA
+R_2rHg5lrVXmLOBdK,I have used tidymodels packages many times,I work in industry,Q5_4,25,Probability threshold optimization,NA
+R_2rHg5lrVXmLOBdK,I have used tidymodels packages many times,I work in industry,Q5_5,0,Spatial analysis models and methods,NA
+R_2rHg5lrVXmLOBdK,I have used tidymodels packages many times,I work in industry,Q5_6,25,Better serialization tools ,NA
+R_2rHg5lrVXmLOBdK,I have used tidymodels packages many times,I work in industry,Q5_10,0,H2O.ai support ,NA
+R_2rHg5lrVXmLOBdK,I have used tidymodels packages many times,I work in industry,Q5_12,0,Other,NA
+R_2DSkYdoe0LzJSXo,I have used tidymodels packages many times,I work in industry,Q5_1,0,Model fairness analysis and metrics,NA
+R_2DSkYdoe0LzJSXo,I have used tidymodels packages many times,I work in industry,Q5_2,0,Supervised feature selection,NA
+R_2DSkYdoe0LzJSXo,I have used tidymodels packages many times,I work in industry,Q5_3,100,Probability calibration (post modeling),NA
+R_2DSkYdoe0LzJSXo,I have used tidymodels packages many times,I work in industry,Q5_4,0,Probability threshold optimization,NA
+R_2DSkYdoe0LzJSXo,I have used tidymodels packages many times,I work in industry,Q5_5,0,Spatial analysis models and methods,NA
+R_2DSkYdoe0LzJSXo,I have used tidymodels packages many times,I work in industry,Q5_6,0,Better serialization tools ,NA
+R_2DSkYdoe0LzJSXo,I have used tidymodels packages many times,I work in industry,Q5_10,0,H2O.ai support ,NA
+R_2DSkYdoe0LzJSXo,I have used tidymodels packages many times,I work in industry,Q5_12,0,Other,NA
+R_2OZsUAb7XxWCgSd,I have used tidymodels packages many times,I work in industry,Q5_1,0,Model fairness analysis and metrics,NA
+R_2OZsUAb7XxWCgSd,I have used tidymodels packages many times,I work in industry,Q5_2,30,Supervised feature selection,NA
+R_2OZsUAb7XxWCgSd,I have used tidymodels packages many times,I work in industry,Q5_3,0,Probability calibration (post modeling),NA
+R_2OZsUAb7XxWCgSd,I have used tidymodels packages many times,I work in industry,Q5_4,0,Probability threshold optimization,NA
+R_2OZsUAb7XxWCgSd,I have used tidymodels packages many times,I work in industry,Q5_5,0,Spatial analysis models and methods,NA
+R_2OZsUAb7XxWCgSd,I have used tidymodels packages many times,I work in industry,Q5_6,0,Better serialization tools ,NA
+R_2OZsUAb7XxWCgSd,I have used tidymodels packages many times,I work in industry,Q5_10,30,H2O.ai support ,NA
+R_2OZsUAb7XxWCgSd,I have used tidymodels packages many times,I work in industry,Q5_12,40,Other,Nested CV
+R_5jBD1kOCtOuYhSp,I have never used tidymodels,"I am an academic, professor, and/or researcher",Q5_1,0,Model fairness analysis and metrics,NA
+R_5jBD1kOCtOuYhSp,I have never used tidymodels,"I am an academic, professor, and/or researcher",Q5_2,0,Supervised feature selection,NA
+R_5jBD1kOCtOuYhSp,I have never used tidymodels,"I am an academic, professor, and/or researcher",Q5_3,0,Probability calibration (post modeling),NA
+R_5jBD1kOCtOuYhSp,I have never used tidymodels,"I am an academic, professor, and/or researcher",Q5_4,0,Probability threshold optimization,NA
+R_5jBD1kOCtOuYhSp,I have never used tidymodels,"I am an academic, professor, and/or researcher",Q5_5,0,Spatial analysis models and methods,NA
+R_5jBD1kOCtOuYhSp,I have never used tidymodels,"I am an academic, professor, and/or researcher",Q5_6,0,Better serialization tools ,NA
+R_5jBD1kOCtOuYhSp,I have never used tidymodels,"I am an academic, professor, and/or researcher",Q5_10,0,H2O.ai support ,NA
+R_5jBD1kOCtOuYhSp,I have never used tidymodels,"I am an academic, professor, and/or researcher",Q5_12,100,Other,Educational tutorials
+R_2YeMkS9tvGFiwO2,I have used tidymodels packages a few times,I work in industry,Q5_1,20,Model fairness analysis and metrics,NA
+R_2YeMkS9tvGFiwO2,I have used tidymodels packages a few times,I work in industry,Q5_2,40,Supervised feature selection,NA
+R_2YeMkS9tvGFiwO2,I have used tidymodels packages a few times,I work in industry,Q5_3,0,Probability calibration (post modeling),NA
+R_2YeMkS9tvGFiwO2,I have used tidymodels packages a few times,I work in industry,Q5_4,0,Probability threshold optimization,NA
+R_2YeMkS9tvGFiwO2,I have used tidymodels packages a few times,I work in industry,Q5_5,0,Spatial analysis models and methods,NA
+R_2YeMkS9tvGFiwO2,I have used tidymodels packages a few times,I work in industry,Q5_6,40,Better serialization tools ,NA
+R_2YeMkS9tvGFiwO2,I have used tidymodels packages a few times,I work in industry,Q5_10,0,H2O.ai support ,NA
+R_2YeMkS9tvGFiwO2,I have used tidymodels packages a few times,I work in industry,Q5_12,0,Other,NA
+R_2zANPtMFw0SUeiI,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_1,15,Model fairness analysis and metrics,NA
+R_2zANPtMFw0SUeiI,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_2,15,Supervised feature selection,NA
+R_2zANPtMFw0SUeiI,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_3,10,Probability calibration (post modeling),NA
+R_2zANPtMFw0SUeiI,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_4,10,Probability threshold optimization,NA
+R_2zANPtMFw0SUeiI,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_5,10,Spatial analysis models and methods,NA
+R_2zANPtMFw0SUeiI,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_6,10,Better serialization tools ,NA
+R_2zANPtMFw0SUeiI,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_10,15,H2O.ai support ,NA
+R_2zANPtMFw0SUeiI,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_12,15,Other,General Mixed Models & Structural Equation Modelling
+R_1prj1aHL4EKu18O,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_1,75,Model fairness analysis and metrics,NA
+R_1prj1aHL4EKu18O,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_2,0,Supervised feature selection,NA
+R_1prj1aHL4EKu18O,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_3,0,Probability calibration (post modeling),NA
+R_1prj1aHL4EKu18O,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_4,25,Probability threshold optimization,NA
+R_1prj1aHL4EKu18O,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_5,0,Spatial analysis models and methods,NA
+R_1prj1aHL4EKu18O,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_6,0,Better serialization tools ,NA
+R_1prj1aHL4EKu18O,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_10,0,H2O.ai support ,NA
+R_1prj1aHL4EKu18O,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_12,0,Other,NA
+R_1PbcoOMeTVe1c8D,I have used tidymodels packages a few times,I work in industry,Q5_1,0,Model fairness analysis and metrics,NA
+R_1PbcoOMeTVe1c8D,I have used tidymodels packages a few times,I work in industry,Q5_2,0,Supervised feature selection,NA
+R_1PbcoOMeTVe1c8D,I have used tidymodels packages a few times,I work in industry,Q5_3,0,Probability calibration (post modeling),NA
+R_1PbcoOMeTVe1c8D,I have used tidymodels packages a few times,I work in industry,Q5_4,0,Probability threshold optimization,NA
+R_1PbcoOMeTVe1c8D,I have used tidymodels packages a few times,I work in industry,Q5_5,0,Spatial analysis models and methods,NA
+R_1PbcoOMeTVe1c8D,I have used tidymodels packages a few times,I work in industry,Q5_6,20,Better serialization tools ,NA
+R_1PbcoOMeTVe1c8D,I have used tidymodels packages a few times,I work in industry,Q5_10,20,H2O.ai support ,NA
+R_1PbcoOMeTVe1c8D,I have used tidymodels packages a few times,I work in industry,Q5_12,60,Other,"TidyPredict (dealing with long sql scoring), stacks, recipes"
+R_1jHt752jD7ica38,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_1,0,Model fairness analysis and metrics,NA
+R_1jHt752jD7ica38,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_2,0,Supervised feature selection,NA
+R_1jHt752jD7ica38,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_3,34,Probability calibration (post modeling),NA
+R_1jHt752jD7ica38,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_4,33,Probability threshold optimization,NA
+R_1jHt752jD7ica38,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_5,0,Spatial analysis models and methods,NA
+R_1jHt752jD7ica38,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_6,33,Better serialization tools ,NA
+R_1jHt752jD7ica38,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_10,0,H2O.ai support ,NA
+R_1jHt752jD7ica38,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_12,0,Other,NA
+R_Rz6SxbzBxv2Ecal,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_1,30,Model fairness analysis and metrics,NA
+R_Rz6SxbzBxv2Ecal,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_2,10,Supervised feature selection,NA
+R_Rz6SxbzBxv2Ecal,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_3,5,Probability calibration (post modeling),NA
+R_Rz6SxbzBxv2Ecal,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_4,20,Probability threshold optimization,NA
+R_Rz6SxbzBxv2Ecal,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_5,20,Spatial analysis models and methods,NA
+R_Rz6SxbzBxv2Ecal,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_6,0,Better serialization tools ,NA
+R_Rz6SxbzBxv2Ecal,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_10,0,H2O.ai support ,NA
+R_Rz6SxbzBxv2Ecal,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_12,15,Other,Pipeline to connect with huggieface NLP
+R_247Cxyq8W6WYv8K,I have used tidymodels packages a few times,I work in industry,Q5_1,10,Model fairness analysis and metrics,NA
+R_247Cxyq8W6WYv8K,I have used tidymodels packages a few times,I work in industry,Q5_2,10,Supervised feature selection,NA
+R_247Cxyq8W6WYv8K,I have used tidymodels packages a few times,I work in industry,Q5_3,20,Probability calibration (post modeling),NA
+R_247Cxyq8W6WYv8K,I have used tidymodels packages a few times,I work in industry,Q5_4,30,Probability threshold optimization,NA
+R_247Cxyq8W6WYv8K,I have used tidymodels packages a few times,I work in industry,Q5_5,0,Spatial analysis models and methods,NA
+R_247Cxyq8W6WYv8K,I have used tidymodels packages a few times,I work in industry,Q5_6,20,Better serialization tools ,NA
+R_247Cxyq8W6WYv8K,I have used tidymodels packages a few times,I work in industry,Q5_10,10,H2O.ai support ,NA
+R_247Cxyq8W6WYv8K,I have used tidymodels packages a few times,I work in industry,Q5_12,0,Other,NA
+R_br0ZZENp9iOmy41,I have contributed to tidymodels packages or taught others how to use them,"I am an academic, professor, and/or researcher",Q5_1,15,Model fairness analysis and metrics,NA
+R_br0ZZENp9iOmy41,I have contributed to tidymodels packages or taught others how to use them,"I am an academic, professor, and/or researcher",Q5_2,20,Supervised feature selection,NA
+R_br0ZZENp9iOmy41,I have contributed to tidymodels packages or taught others how to use them,"I am an academic, professor, and/or researcher",Q5_3,15,Probability calibration (post modeling),NA
+R_br0ZZENp9iOmy41,I have contributed to tidymodels packages or taught others how to use them,"I am an academic, professor, and/or researcher",Q5_4,10,Probability threshold optimization,NA
+R_br0ZZENp9iOmy41,I have contributed to tidymodels packages or taught others how to use them,"I am an academic, professor, and/or researcher",Q5_5,40,Spatial analysis models and methods,NA
+R_br0ZZENp9iOmy41,I have contributed to tidymodels packages or taught others how to use them,"I am an academic, professor, and/or researcher",Q5_6,0,Better serialization tools ,NA
+R_br0ZZENp9iOmy41,I have contributed to tidymodels packages or taught others how to use them,"I am an academic, professor, and/or researcher",Q5_10,0,H2O.ai support ,NA
+R_br0ZZENp9iOmy41,I have contributed to tidymodels packages or taught others how to use them,"I am an academic, professor, and/or researcher",Q5_12,0,Other,NA
+R_1EZkJAz4pJxpqCq,I have used tidymodels packages a few times,I work in industry,Q5_1,10,Model fairness analysis and metrics,NA
+R_1EZkJAz4pJxpqCq,I have used tidymodels packages a few times,I work in industry,Q5_2,5,Supervised feature selection,NA
+R_1EZkJAz4pJxpqCq,I have used tidymodels packages a few times,I work in industry,Q5_3,10,Probability calibration (post modeling),NA
+R_1EZkJAz4pJxpqCq,I have used tidymodels packages a few times,I work in industry,Q5_4,20,Probability threshold optimization,NA
+R_1EZkJAz4pJxpqCq,I have used tidymodels packages a few times,I work in industry,Q5_5,5,Spatial analysis models and methods,NA
+R_1EZkJAz4pJxpqCq,I have used tidymodels packages a few times,I work in industry,Q5_6,10,Better serialization tools ,NA
+R_1EZkJAz4pJxpqCq,I have used tidymodels packages a few times,I work in industry,Q5_10,40,H2O.ai support ,NA
+R_1EZkJAz4pJxpqCq,I have used tidymodels packages a few times,I work in industry,Q5_12,0,Other,NA
+R_1GkMnCcnQWtu8db,I have used tidymodels packages a few times,I work in industry,Q5_1,20,Model fairness analysis and metrics,NA
+R_1GkMnCcnQWtu8db,I have used tidymodels packages a few times,I work in industry,Q5_2,20,Supervised feature selection,NA
+R_1GkMnCcnQWtu8db,I have used tidymodels packages a few times,I work in industry,Q5_3,20,Probability calibration (post modeling),NA
+R_1GkMnCcnQWtu8db,I have used tidymodels packages a few times,I work in industry,Q5_4,20,Probability threshold optimization,NA
+R_1GkMnCcnQWtu8db,I have used tidymodels packages a few times,I work in industry,Q5_5,0,Spatial analysis models and methods,NA
+R_1GkMnCcnQWtu8db,I have used tidymodels packages a few times,I work in industry,Q5_6,0,Better serialization tools ,NA
+R_1GkMnCcnQWtu8db,I have used tidymodels packages a few times,I work in industry,Q5_10,0,H2O.ai support ,NA
+R_1GkMnCcnQWtu8db,I have used tidymodels packages a few times,I work in industry,Q5_12,20,Other,Simpler custom recipe steps
+R_Pz9sB9jSo61HA3L,I have used tidymodels packages many times,I work in industry,Q5_1,40,Model fairness analysis and metrics,NA
+R_Pz9sB9jSo61HA3L,I have used tidymodels packages many times,I work in industry,Q5_2,0,Supervised feature selection,NA
+R_Pz9sB9jSo61HA3L,I have used tidymodels packages many times,I work in industry,Q5_3,0,Probability calibration (post modeling),NA
+R_Pz9sB9jSo61HA3L,I have used tidymodels packages many times,I work in industry,Q5_4,20,Probability threshold optimization,NA
+R_Pz9sB9jSo61HA3L,I have used tidymodels packages many times,I work in industry,Q5_5,0,Spatial analysis models and methods,NA
+R_Pz9sB9jSo61HA3L,I have used tidymodels packages many times,I work in industry,Q5_6,0,Better serialization tools ,NA
+R_Pz9sB9jSo61HA3L,I have used tidymodels packages many times,I work in industry,Q5_10,40,H2O.ai support ,NA
+R_Pz9sB9jSo61HA3L,I have used tidymodels packages many times,I work in industry,Q5_12,0,Other,NA
+R_blmSJeeV4ZSWUSd,I have used tidymodels packages a few times,I work in industry,Q5_1,20,Model fairness analysis and metrics,NA
+R_blmSJeeV4ZSWUSd,I have used tidymodels packages a few times,I work in industry,Q5_2,20,Supervised feature selection,NA
+R_blmSJeeV4ZSWUSd,I have used tidymodels packages a few times,I work in industry,Q5_3,20,Probability calibration (post modeling),NA
+R_blmSJeeV4ZSWUSd,I have used tidymodels packages a few times,I work in industry,Q5_4,10,Probability threshold optimization,NA
+R_blmSJeeV4ZSWUSd,I have used tidymodels packages a few times,I work in industry,Q5_5,0,Spatial analysis models and methods,NA
+R_blmSJeeV4ZSWUSd,I have used tidymodels packages a few times,I work in industry,Q5_6,30,Better serialization tools ,NA
+R_blmSJeeV4ZSWUSd,I have used tidymodels packages a few times,I work in industry,Q5_10,0,H2O.ai support ,NA
+R_blmSJeeV4ZSWUSd,I have used tidymodels packages a few times,I work in industry,Q5_12,0,Other,NA
+R_BAtjQN7fXORF5q9,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_1,0,Model fairness analysis and metrics,NA
+R_BAtjQN7fXORF5q9,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_2,0,Supervised feature selection,NA
+R_BAtjQN7fXORF5q9,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_3,0,Probability calibration (post modeling),NA
+R_BAtjQN7fXORF5q9,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_4,0,Probability threshold optimization,NA
+R_BAtjQN7fXORF5q9,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_5,0,Spatial analysis models and methods,NA
+R_BAtjQN7fXORF5q9,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_6,0,Better serialization tools ,NA
+R_BAtjQN7fXORF5q9,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_10,0,H2O.ai support ,NA
+R_BAtjQN7fXORF5q9,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_12,100,Other,Robust models
+R_2uOrXzTjRN8e03j,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_1,0,Model fairness analysis and metrics,NA
+R_2uOrXzTjRN8e03j,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_2,5,Supervised feature selection,NA
+R_2uOrXzTjRN8e03j,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_3,5,Probability calibration (post modeling),NA
+R_2uOrXzTjRN8e03j,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_4,0,Probability threshold optimization,NA
+R_2uOrXzTjRN8e03j,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_5,90,Spatial analysis models and methods,NA
+R_2uOrXzTjRN8e03j,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_6,0,Better serialization tools ,NA
+R_2uOrXzTjRN8e03j,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_10,0,H2O.ai support ,NA
+R_2uOrXzTjRN8e03j,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_12,0,Other,NA
+R_WePooYNdhNt81tT,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_1,0,Model fairness analysis and metrics,NA
+R_WePooYNdhNt81tT,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_2,25,Supervised feature selection,NA
+R_WePooYNdhNt81tT,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_3,0,Probability calibration (post modeling),NA
+R_WePooYNdhNt81tT,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_4,0,Probability threshold optimization,NA
+R_WePooYNdhNt81tT,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_5,0,Spatial analysis models and methods,NA
+R_WePooYNdhNt81tT,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_6,0,Better serialization tools ,NA
+R_WePooYNdhNt81tT,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_10,50,H2O.ai support ,NA
+R_WePooYNdhNt81tT,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_12,25,Other,Better Keras support
+R_eXbmLDRQXWev6Rr,I have used tidymodels packages a few times,I work in industry,Q5_1,0,Model fairness analysis and metrics,NA
+R_eXbmLDRQXWev6Rr,I have used tidymodels packages a few times,I work in industry,Q5_2,40,Supervised feature selection,NA
+R_eXbmLDRQXWev6Rr,I have used tidymodels packages a few times,I work in industry,Q5_3,25,Probability calibration (post modeling),NA
+R_eXbmLDRQXWev6Rr,I have used tidymodels packages a few times,I work in industry,Q5_4,20,Probability threshold optimization,NA
+R_eXbmLDRQXWev6Rr,I have used tidymodels packages a few times,I work in industry,Q5_5,0,Spatial analysis models and methods,NA
+R_eXbmLDRQXWev6Rr,I have used tidymodels packages a few times,I work in industry,Q5_6,0,Better serialization tools ,NA
+R_eXbmLDRQXWev6Rr,I have used tidymodels packages a few times,I work in industry,Q5_10,15,H2O.ai support ,NA
+R_eXbmLDRQXWev6Rr,I have used tidymodels packages a few times,I work in industry,Q5_12,0,Other,NA
+R_3gwvK7Y8gAloGMp,I have used tidymodels packages a few times,I work in industry,Q5_1,10,Model fairness analysis and metrics,NA
+R_3gwvK7Y8gAloGMp,I have used tidymodels packages a few times,I work in industry,Q5_2,0,Supervised feature selection,NA
+R_3gwvK7Y8gAloGMp,I have used tidymodels packages a few times,I work in industry,Q5_3,20,Probability calibration (post modeling),NA
+R_3gwvK7Y8gAloGMp,I have used tidymodels packages a few times,I work in industry,Q5_4,35,Probability threshold optimization,NA
+R_3gwvK7Y8gAloGMp,I have used tidymodels packages a few times,I work in industry,Q5_5,10,Spatial analysis models and methods,NA
+R_3gwvK7Y8gAloGMp,I have used tidymodels packages a few times,I work in industry,Q5_6,25,Better serialization tools ,NA
+R_3gwvK7Y8gAloGMp,I have used tidymodels packages a few times,I work in industry,Q5_10,0,H2O.ai support ,NA
+R_3gwvK7Y8gAloGMp,I have used tidymodels packages a few times,I work in industry,Q5_12,0,Other,NA
+R_2SAZhU6w1RQ4k7m,I have never used tidymodels,"I am an academic, professor, and/or researcher",Q5_1,10,Model fairness analysis and metrics,NA
+R_2SAZhU6w1RQ4k7m,I have never used tidymodels,"I am an academic, professor, and/or researcher",Q5_2,0,Supervised feature selection,NA
+R_2SAZhU6w1RQ4k7m,I have never used tidymodels,"I am an academic, professor, and/or researcher",Q5_3,0,Probability calibration (post modeling),NA
+R_2SAZhU6w1RQ4k7m,I have never used tidymodels,"I am an academic, professor, and/or researcher",Q5_4,0,Probability threshold optimization,NA
+R_2SAZhU6w1RQ4k7m,I have never used tidymodels,"I am an academic, professor, and/or researcher",Q5_5,10,Spatial analysis models and methods,NA
+R_2SAZhU6w1RQ4k7m,I have never used tidymodels,"I am an academic, professor, and/or researcher",Q5_6,0,Better serialization tools ,NA
+R_2SAZhU6w1RQ4k7m,I have never used tidymodels,"I am an academic, professor, and/or researcher",Q5_10,0,H2O.ai support ,NA
+R_2SAZhU6w1RQ4k7m,I have never used tidymodels,"I am an academic, professor, and/or researcher",Q5_12,80,Other,More Bayes
+R_1hKgjIxNvQn3OTy,I have used tidymodels packages many times,I am a student,Q5_1,0,Model fairness analysis and metrics,NA
+R_1hKgjIxNvQn3OTy,I have used tidymodels packages many times,I am a student,Q5_2,0,Supervised feature selection,NA
+R_1hKgjIxNvQn3OTy,I have used tidymodels packages many times,I am a student,Q5_3,0,Probability calibration (post modeling),NA
+R_1hKgjIxNvQn3OTy,I have used tidymodels packages many times,I am a student,Q5_4,30,Probability threshold optimization,NA
+R_1hKgjIxNvQn3OTy,I have used tidymodels packages many times,I am a student,Q5_5,0,Spatial analysis models and methods,NA
+R_1hKgjIxNvQn3OTy,I have used tidymodels packages many times,I am a student,Q5_6,20,Better serialization tools ,NA
+R_1hKgjIxNvQn3OTy,I have used tidymodels packages many times,I am a student,Q5_10,50,H2O.ai support ,NA
+R_1hKgjIxNvQn3OTy,I have used tidymodels packages many times,I am a student,Q5_12,0,Other,NA
+R_siFY5X4ArroJfjz,I have used tidymodels packages many times,I work in industry,Q5_1,10,Model fairness analysis and metrics,NA
+R_siFY5X4ArroJfjz,I have used tidymodels packages many times,I work in industry,Q5_2,0,Supervised feature selection,NA
+R_siFY5X4ArroJfjz,I have used tidymodels packages many times,I work in industry,Q5_3,15,Probability calibration (post modeling),NA
+R_siFY5X4ArroJfjz,I have used tidymodels packages many times,I work in industry,Q5_4,0,Probability threshold optimization,NA
+R_siFY5X4ArroJfjz,I have used tidymodels packages many times,I work in industry,Q5_5,50,Spatial analysis models and methods,NA
+R_siFY5X4ArroJfjz,I have used tidymodels packages many times,I work in industry,Q5_6,0,Better serialization tools ,NA
+R_siFY5X4ArroJfjz,I have used tidymodels packages many times,I work in industry,Q5_10,0,H2O.ai support ,NA
+R_siFY5X4ArroJfjz,I have used tidymodels packages many times,I work in industry,Q5_12,25,Other,Deployment in production layer
+R_VW0xBvVbz1NUA1P,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_1,0,Model fairness analysis and metrics,NA
+R_VW0xBvVbz1NUA1P,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_2,0,Supervised feature selection,NA
+R_VW0xBvVbz1NUA1P,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_3,0,Probability calibration (post modeling),NA
+R_VW0xBvVbz1NUA1P,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_4,20,Probability threshold optimization,NA
+R_VW0xBvVbz1NUA1P,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_5,0,Spatial analysis models and methods,NA
+R_VW0xBvVbz1NUA1P,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_6,0,Better serialization tools ,NA
+R_VW0xBvVbz1NUA1P,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_10,20,H2O.ai support ,NA
+R_VW0xBvVbz1NUA1P,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_12,60,Other,"Please consider renaming your functions (& possibly integrate interpretations like lime, shapley and so on possibly in a similar way as brooom::autment would do)"
+R_2dKllTFAjDrTKzN,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_1,50,Model fairness analysis and metrics,NA
+R_2dKllTFAjDrTKzN,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_2,0,Supervised feature selection,NA
+R_2dKllTFAjDrTKzN,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_3,0,Probability calibration (post modeling),NA
+R_2dKllTFAjDrTKzN,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_4,0,Probability threshold optimization,NA
+R_2dKllTFAjDrTKzN,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_5,0,Spatial analysis models and methods,NA
+R_2dKllTFAjDrTKzN,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_6,20,Better serialization tools ,NA
+R_2dKllTFAjDrTKzN,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_10,30,H2O.ai support ,NA
+R_2dKllTFAjDrTKzN,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_12,0,Other,NA
+R_2RQzEoIKAqICMeh,I have used tidymodels packages a few times,I work in industry,Q5_1,0,Model fairness analysis and metrics,NA
+R_2RQzEoIKAqICMeh,I have used tidymodels packages a few times,I work in industry,Q5_2,10,Supervised feature selection,NA
+R_2RQzEoIKAqICMeh,I have used tidymodels packages a few times,I work in industry,Q5_3,0,Probability calibration (post modeling),NA
+R_2RQzEoIKAqICMeh,I have used tidymodels packages a few times,I work in industry,Q5_4,0,Probability threshold optimization,NA
+R_2RQzEoIKAqICMeh,I have used tidymodels packages a few times,I work in industry,Q5_5,50,Spatial analysis models and methods,NA
+R_2RQzEoIKAqICMeh,I have used tidymodels packages a few times,I work in industry,Q5_6,40,Better serialization tools ,NA
+R_2RQzEoIKAqICMeh,I have used tidymodels packages a few times,I work in industry,Q5_10,0,H2O.ai support ,NA
+R_2RQzEoIKAqICMeh,I have used tidymodels packages a few times,I work in industry,Q5_12,0,Other,NA
+R_43lpmOlVOGqxK9P,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_1,0,Model fairness analysis and metrics,NA
+R_43lpmOlVOGqxK9P,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_2,0,Supervised feature selection,NA
+R_43lpmOlVOGqxK9P,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_3,0,Probability calibration (post modeling),NA
+R_43lpmOlVOGqxK9P,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_4,0,Probability threshold optimization,NA
+R_43lpmOlVOGqxK9P,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_5,75,Spatial analysis models and methods,NA
+R_43lpmOlVOGqxK9P,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_6,25,Better serialization tools ,NA
+R_43lpmOlVOGqxK9P,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_10,0,H2O.ai support ,NA
+R_43lpmOlVOGqxK9P,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_12,0,Other,NA
+R_1BWNr9JeyhoFBly,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_1,0,Model fairness analysis and metrics,NA
+R_1BWNr9JeyhoFBly,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_2,0,Supervised feature selection,NA
+R_1BWNr9JeyhoFBly,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_3,0,Probability calibration (post modeling),NA
+R_1BWNr9JeyhoFBly,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_4,0,Probability threshold optimization,NA
+R_1BWNr9JeyhoFBly,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_5,100,Spatial analysis models and methods,NA
+R_1BWNr9JeyhoFBly,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_6,0,Better serialization tools ,NA
+R_1BWNr9JeyhoFBly,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_10,0,H2O.ai support ,NA
+R_1BWNr9JeyhoFBly,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_12,0,Other,NA
+R_2WZLiAFtPRylNGz,I have used tidymodels packages many times,I am a student,Q5_1,10,Model fairness analysis and metrics,NA
+R_2WZLiAFtPRylNGz,I have used tidymodels packages many times,I am a student,Q5_2,15,Supervised feature selection,NA
+R_2WZLiAFtPRylNGz,I have used tidymodels packages many times,I am a student,Q5_3,10,Probability calibration (post modeling),NA
+R_2WZLiAFtPRylNGz,I have used tidymodels packages many times,I am a student,Q5_4,15,Probability threshold optimization,NA
+R_2WZLiAFtPRylNGz,I have used tidymodels packages many times,I am a student,Q5_5,45,Spatial analysis models and methods,NA
+R_2WZLiAFtPRylNGz,I have used tidymodels packages many times,I am a student,Q5_6,5,Better serialization tools ,NA
+R_2WZLiAFtPRylNGz,I have used tidymodels packages many times,I am a student,Q5_10,0,H2O.ai support ,NA
+R_2WZLiAFtPRylNGz,I have used tidymodels packages many times,I am a student,Q5_12,0,Other,NA
+R_2WCNjs7O27yPWu8,I have used tidymodels packages many times,I work in industry,Q5_1,0,Model fairness analysis and metrics,NA
+R_2WCNjs7O27yPWu8,I have used tidymodels packages many times,I work in industry,Q5_2,0,Supervised feature selection,NA
+R_2WCNjs7O27yPWu8,I have used tidymodels packages many times,I work in industry,Q5_3,0,Probability calibration (post modeling),NA
+R_2WCNjs7O27yPWu8,I have used tidymodels packages many times,I work in industry,Q5_4,0,Probability threshold optimization,NA
+R_2WCNjs7O27yPWu8,I have used tidymodels packages many times,I work in industry,Q5_5,0,Spatial analysis models and methods,NA
+R_2WCNjs7O27yPWu8,I have used tidymodels packages many times,I work in industry,Q5_6,50,Better serialization tools ,NA
+R_2WCNjs7O27yPWu8,I have used tidymodels packages many times,I work in industry,Q5_10,0,H2O.ai support ,NA
+R_2WCNjs7O27yPWu8,I have used tidymodels packages many times,I work in industry,Q5_12,50,Other,Deployment
+R_2cvgiO2Yq1HW0ZJ,I have used tidymodels packages a few times,I am a student,Q5_1,25,Model fairness analysis and metrics,NA
+R_2cvgiO2Yq1HW0ZJ,I have used tidymodels packages a few times,I am a student,Q5_2,25,Supervised feature selection,NA
+R_2cvgiO2Yq1HW0ZJ,I have used tidymodels packages a few times,I am a student,Q5_3,0,Probability calibration (post modeling),NA
+R_2cvgiO2Yq1HW0ZJ,I have used tidymodels packages a few times,I am a student,Q5_4,25,Probability threshold optimization,NA
+R_2cvgiO2Yq1HW0ZJ,I have used tidymodels packages a few times,I am a student,Q5_5,0,Spatial analysis models and methods,NA
+R_2cvgiO2Yq1HW0ZJ,I have used tidymodels packages a few times,I am a student,Q5_6,0,Better serialization tools ,NA
+R_2cvgiO2Yq1HW0ZJ,I have used tidymodels packages a few times,I am a student,Q5_10,0,H2O.ai support ,NA
+R_2cvgiO2Yq1HW0ZJ,I have used tidymodels packages a few times,I am a student,Q5_12,25,Other,Model interpretation
+R_1rAikwLvRaq122a,I have used tidymodels packages many times,I work in industry,Q5_1,10,Model fairness analysis and metrics,NA
+R_1rAikwLvRaq122a,I have used tidymodels packages many times,I work in industry,Q5_2,30,Supervised feature selection,NA
+R_1rAikwLvRaq122a,I have used tidymodels packages many times,I work in industry,Q5_3,20,Probability calibration (post modeling),NA
+R_1rAikwLvRaq122a,I have used tidymodels packages many times,I work in industry,Q5_4,10,Probability threshold optimization,NA
+R_1rAikwLvRaq122a,I have used tidymodels packages many times,I work in industry,Q5_5,0,Spatial analysis models and methods,NA
+R_1rAikwLvRaq122a,I have used tidymodels packages many times,I work in industry,Q5_6,20,Better serialization tools ,NA
+R_1rAikwLvRaq122a,I have used tidymodels packages many times,I work in industry,Q5_10,10,H2O.ai support ,NA
+R_1rAikwLvRaq122a,I have used tidymodels packages many times,I work in industry,Q5_12,0,Other,NA
+R_1Kx0Duu8DHxyffC,I have used tidymodels packages many times,I work in industry,Q5_1,0,Model fairness analysis and metrics,NA
+R_1Kx0Duu8DHxyffC,I have used tidymodels packages many times,I work in industry,Q5_2,0,Supervised feature selection,NA
+R_1Kx0Duu8DHxyffC,I have used tidymodels packages many times,I work in industry,Q5_3,0,Probability calibration (post modeling),NA
+R_1Kx0Duu8DHxyffC,I have used tidymodels packages many times,I work in industry,Q5_4,0,Probability threshold optimization,NA
+R_1Kx0Duu8DHxyffC,I have used tidymodels packages many times,I work in industry,Q5_5,0,Spatial analysis models and methods,NA
+R_1Kx0Duu8DHxyffC,I have used tidymodels packages many times,I work in industry,Q5_6,30,Better serialization tools ,NA
+R_1Kx0Duu8DHxyffC,I have used tidymodels packages many times,I work in industry,Q5_10,70,H2O.ai support ,NA
+R_1Kx0Duu8DHxyffC,I have used tidymodels packages many times,I work in industry,Q5_12,0,Other,NA
+R_2czsxgTyvAQEiTM,I have used tidymodels packages a few times,I work in industry,Q5_1,15,Model fairness analysis and metrics,NA
+R_2czsxgTyvAQEiTM,I have used tidymodels packages a few times,I work in industry,Q5_2,15,Supervised feature selection,NA
+R_2czsxgTyvAQEiTM,I have used tidymodels packages a few times,I work in industry,Q5_3,5,Probability calibration (post modeling),NA
+R_2czsxgTyvAQEiTM,I have used tidymodels packages a few times,I work in industry,Q5_4,25,Probability threshold optimization,NA
+R_2czsxgTyvAQEiTM,I have used tidymodels packages a few times,I work in industry,Q5_5,10,Spatial analysis models and methods,NA
+R_2czsxgTyvAQEiTM,I have used tidymodels packages a few times,I work in industry,Q5_6,5,Better serialization tools ,NA
+R_2czsxgTyvAQEiTM,I have used tidymodels packages a few times,I work in industry,Q5_10,25,H2O.ai support ,NA
+R_2czsxgTyvAQEiTM,I have used tidymodels packages a few times,I work in industry,Q5_12,0,Other,NA
+R_AKviJT8KBco2QCZ,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_1,20,Model fairness analysis and metrics,NA
+R_AKviJT8KBco2QCZ,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_2,50,Supervised feature selection,NA
+R_AKviJT8KBco2QCZ,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_3,15,Probability calibration (post modeling),NA
+R_AKviJT8KBco2QCZ,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_4,15,Probability threshold optimization,NA
+R_AKviJT8KBco2QCZ,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_5,0,Spatial analysis models and methods,NA
+R_AKviJT8KBco2QCZ,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_6,0,Better serialization tools ,NA
+R_AKviJT8KBco2QCZ,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_10,0,H2O.ai support ,NA
+R_AKviJT8KBco2QCZ,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_12,0,Other,NA
+R_z3gzF2O2SuttHO1,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_1,10,Model fairness analysis and metrics,NA
+R_z3gzF2O2SuttHO1,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_2,15,Supervised feature selection,NA
+R_z3gzF2O2SuttHO1,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_3,5,Probability calibration (post modeling),NA
+R_z3gzF2O2SuttHO1,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_4,5,Probability threshold optimization,NA
+R_z3gzF2O2SuttHO1,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_5,0,Spatial analysis models and methods,NA
+R_z3gzF2O2SuttHO1,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_6,15,Better serialization tools ,NA
+R_z3gzF2O2SuttHO1,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_10,0,H2O.ai support ,NA
+R_z3gzF2O2SuttHO1,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_12,50,Other,deployment automation/efficiency
+R_3PGgqM2pBiNlHi1,I have used tidymodels packages many times,I work in industry,Q5_1,15,Model fairness analysis and metrics,NA
+R_3PGgqM2pBiNlHi1,I have used tidymodels packages many times,I work in industry,Q5_2,45,Supervised feature selection,NA
+R_3PGgqM2pBiNlHi1,I have used tidymodels packages many times,I work in industry,Q5_3,25,Probability calibration (post modeling),NA
+R_3PGgqM2pBiNlHi1,I have used tidymodels packages many times,I work in industry,Q5_4,15,Probability threshold optimization,NA
+R_3PGgqM2pBiNlHi1,I have used tidymodels packages many times,I work in industry,Q5_5,0,Spatial analysis models and methods,NA
+R_3PGgqM2pBiNlHi1,I have used tidymodels packages many times,I work in industry,Q5_6,0,Better serialization tools ,NA
+R_3PGgqM2pBiNlHi1,I have used tidymodels packages many times,I work in industry,Q5_10,0,H2O.ai support ,NA
+R_3PGgqM2pBiNlHi1,I have used tidymodels packages many times,I work in industry,Q5_12,0,Other,NA
+R_2465nklicHelRAW,I have used tidymodels packages many times,I work in industry,Q5_1,50,Model fairness analysis and metrics,NA
+R_2465nklicHelRAW,I have used tidymodels packages many times,I work in industry,Q5_2,40,Supervised feature selection,NA
+R_2465nklicHelRAW,I have used tidymodels packages many times,I work in industry,Q5_3,10,Probability calibration (post modeling),NA
+R_2465nklicHelRAW,I have used tidymodels packages many times,I work in industry,Q5_4,0,Probability threshold optimization,NA
+R_2465nklicHelRAW,I have used tidymodels packages many times,I work in industry,Q5_5,0,Spatial analysis models and methods,NA
+R_2465nklicHelRAW,I have used tidymodels packages many times,I work in industry,Q5_6,0,Better serialization tools ,NA
+R_2465nklicHelRAW,I have used tidymodels packages many times,I work in industry,Q5_10,0,H2O.ai support ,NA
+R_2465nklicHelRAW,I have used tidymodels packages many times,I work in industry,Q5_12,0,Other,NA
+R_20YUKHLgvnJSo6l,I have used tidymodels packages many times,I work in industry,Q5_1,20,Model fairness analysis and metrics,NA
+R_20YUKHLgvnJSo6l,I have used tidymodels packages many times,I work in industry,Q5_2,15,Supervised feature selection,NA
+R_20YUKHLgvnJSo6l,I have used tidymodels packages many times,I work in industry,Q5_3,0,Probability calibration (post modeling),NA
+R_20YUKHLgvnJSo6l,I have used tidymodels packages many times,I work in industry,Q5_4,0,Probability threshold optimization,NA
+R_20YUKHLgvnJSo6l,I have used tidymodels packages many times,I work in industry,Q5_5,15,Spatial analysis models and methods,NA
+R_20YUKHLgvnJSo6l,I have used tidymodels packages many times,I work in industry,Q5_6,50,Better serialization tools ,NA
+R_20YUKHLgvnJSo6l,I have used tidymodels packages many times,I work in industry,Q5_10,0,H2O.ai support ,NA
+R_20YUKHLgvnJSo6l,I have used tidymodels packages many times,I work in industry,Q5_12,0,Other,NA
+R_3h9kBdsZcmbFeDe,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_1,50,Model fairness analysis and metrics,NA
+R_3h9kBdsZcmbFeDe,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_2,0,Supervised feature selection,NA
+R_3h9kBdsZcmbFeDe,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_3,5,Probability calibration (post modeling),NA
+R_3h9kBdsZcmbFeDe,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_4,30,Probability threshold optimization,NA
+R_3h9kBdsZcmbFeDe,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_5,15,Spatial analysis models and methods,NA
+R_3h9kBdsZcmbFeDe,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_6,0,Better serialization tools ,NA
+R_3h9kBdsZcmbFeDe,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_10,0,H2O.ai support ,NA
+R_3h9kBdsZcmbFeDe,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_12,0,Other,NA
+R_3qjHwG1i1xedjGY,I have used tidymodels packages a few times,I work in industry,Q5_1,5,Model fairness analysis and metrics,NA
+R_3qjHwG1i1xedjGY,I have used tidymodels packages a few times,I work in industry,Q5_2,0,Supervised feature selection,NA
+R_3qjHwG1i1xedjGY,I have used tidymodels packages a few times,I work in industry,Q5_3,0,Probability calibration (post modeling),NA
+R_3qjHwG1i1xedjGY,I have used tidymodels packages a few times,I work in industry,Q5_4,0,Probability threshold optimization,NA
+R_3qjHwG1i1xedjGY,I have used tidymodels packages a few times,I work in industry,Q5_5,0,Spatial analysis models and methods,NA
+R_3qjHwG1i1xedjGY,I have used tidymodels packages a few times,I work in industry,Q5_6,5,Better serialization tools ,NA
+R_3qjHwG1i1xedjGY,I have used tidymodels packages a few times,I work in industry,Q5_10,5,H2O.ai support ,NA
+R_3qjHwG1i1xedjGY,I have used tidymodels packages a few times,I work in industry,Q5_12,85,Other,"Time series: integrate with fabletools ecosystem and / or cultivate modeltime ecosystem (very good work but unfortunately the docs, site, etc. feel just like an advertisements which is way below RStudio’s high standards)"
+R_2QRLpSq5HReLBju,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_1,20,Model fairness analysis and metrics,NA
+R_2QRLpSq5HReLBju,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_2,20,Supervised feature selection,NA
+R_2QRLpSq5HReLBju,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_3,10,Probability calibration (post modeling),NA
+R_2QRLpSq5HReLBju,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_4,12,Probability threshold optimization,NA
+R_2QRLpSq5HReLBju,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_5,12,Spatial analysis models and methods,NA
+R_2QRLpSq5HReLBju,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_6,10,Better serialization tools ,NA
+R_2QRLpSq5HReLBju,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_10,13,H2O.ai support ,NA
+R_2QRLpSq5HReLBju,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_12,3,Other,NA
+R_3nOvbD1hzBw7ilP,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_1,0,Model fairness analysis and metrics,NA
+R_3nOvbD1hzBw7ilP,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_2,0,Supervised feature selection,NA
+R_3nOvbD1hzBw7ilP,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_3,0,Probability calibration (post modeling),NA
+R_3nOvbD1hzBw7ilP,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_4,0,Probability threshold optimization,NA
+R_3nOvbD1hzBw7ilP,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_5,0,Spatial analysis models and methods,NA
+R_3nOvbD1hzBw7ilP,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_6,0,Better serialization tools ,NA
+R_3nOvbD1hzBw7ilP,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_10,0,H2O.ai support ,NA
+R_3nOvbD1hzBw7ilP,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_12,100,Other,mixed linear models
+R_1NxKYvdnTOgWINX,I have used tidymodels packages a few times,I work in industry,Q5_1,20,Model fairness analysis and metrics,NA
+R_1NxKYvdnTOgWINX,I have used tidymodels packages a few times,I work in industry,Q5_2,20,Supervised feature selection,NA
+R_1NxKYvdnTOgWINX,I have used tidymodels packages a few times,I work in industry,Q5_3,0,Probability calibration (post modeling),NA
+R_1NxKYvdnTOgWINX,I have used tidymodels packages a few times,I work in industry,Q5_4,10,Probability threshold optimization,NA
+R_1NxKYvdnTOgWINX,I have used tidymodels packages a few times,I work in industry,Q5_5,40,Spatial analysis models and methods,NA
+R_1NxKYvdnTOgWINX,I have used tidymodels packages a few times,I work in industry,Q5_6,0,Better serialization tools ,NA
+R_1NxKYvdnTOgWINX,I have used tidymodels packages a few times,I work in industry,Q5_10,10,H2O.ai support ,NA
+R_1NxKYvdnTOgWINX,I have used tidymodels packages a few times,I work in industry,Q5_12,0,Other,NA
+R_2OHKZAoF6aVENrn,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_1,20,Model fairness analysis and metrics,NA
+R_2OHKZAoF6aVENrn,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_2,20,Supervised feature selection,NA
+R_2OHKZAoF6aVENrn,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_3,10,Probability calibration (post modeling),NA
+R_2OHKZAoF6aVENrn,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_4,10,Probability threshold optimization,NA
+R_2OHKZAoF6aVENrn,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_5,5,Spatial analysis models and methods,NA
+R_2OHKZAoF6aVENrn,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_6,15,Better serialization tools ,NA
+R_2OHKZAoF6aVENrn,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_10,20,H2O.ai support ,NA
+R_2OHKZAoF6aVENrn,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_12,0,Other,NA
+R_2c2vP1uZmRAcGfc,I have contributed to tidymodels packages or taught others how to use them,"I am an academic, professor, and/or researcher",Q5_1,70,Model fairness analysis and metrics,NA
+R_2c2vP1uZmRAcGfc,I have contributed to tidymodels packages or taught others how to use them,"I am an academic, professor, and/or researcher",Q5_2,0,Supervised feature selection,NA
+R_2c2vP1uZmRAcGfc,I have contributed to tidymodels packages or taught others how to use them,"I am an academic, professor, and/or researcher",Q5_3,0,Probability calibration (post modeling),NA
+R_2c2vP1uZmRAcGfc,I have contributed to tidymodels packages or taught others how to use them,"I am an academic, professor, and/or researcher",Q5_4,20,Probability threshold optimization,NA
+R_2c2vP1uZmRAcGfc,I have contributed to tidymodels packages or taught others how to use them,"I am an academic, professor, and/or researcher",Q5_5,10,Spatial analysis models and methods,NA
+R_2c2vP1uZmRAcGfc,I have contributed to tidymodels packages or taught others how to use them,"I am an academic, professor, and/or researcher",Q5_6,0,Better serialization tools ,NA
+R_2c2vP1uZmRAcGfc,I have contributed to tidymodels packages or taught others how to use them,"I am an academic, professor, and/or researcher",Q5_10,0,H2O.ai support ,NA
+R_2c2vP1uZmRAcGfc,I have contributed to tidymodels packages or taught others how to use them,"I am an academic, professor, and/or researcher",Q5_12,0,Other,NA
+R_2TsKb0bbJLs9llL,I have used tidymodels packages many times,I work in industry,Q5_1,20,Model fairness analysis and metrics,NA
+R_2TsKb0bbJLs9llL,I have used tidymodels packages many times,I work in industry,Q5_2,0,Supervised feature selection,NA
+R_2TsKb0bbJLs9llL,I have used tidymodels packages many times,I work in industry,Q5_3,20,Probability calibration (post modeling),NA
+R_2TsKb0bbJLs9llL,I have used tidymodels packages many times,I work in industry,Q5_4,10,Probability threshold optimization,NA
+R_2TsKb0bbJLs9llL,I have used tidymodels packages many times,I work in industry,Q5_5,0,Spatial analysis models and methods,NA
+R_2TsKb0bbJLs9llL,I have used tidymodels packages many times,I work in industry,Q5_6,20,Better serialization tools ,NA
+R_2TsKb0bbJLs9llL,I have used tidymodels packages many times,I work in industry,Q5_10,0,H2O.ai support ,NA
+R_2TsKb0bbJLs9llL,I have used tidymodels packages many times,I work in industry,Q5_12,30,Other,Model deployment and performance tracking :)
+R_2fdhgw8wozW3afw,I have used tidymodels packages many times,I am a student,Q5_1,35,Model fairness analysis and metrics,NA
+R_2fdhgw8wozW3afw,I have used tidymodels packages many times,I am a student,Q5_2,0,Supervised feature selection,NA
+R_2fdhgw8wozW3afw,I have used tidymodels packages many times,I am a student,Q5_3,0,Probability calibration (post modeling),NA
+R_2fdhgw8wozW3afw,I have used tidymodels packages many times,I am a student,Q5_4,0,Probability threshold optimization,NA
+R_2fdhgw8wozW3afw,I have used tidymodels packages many times,I am a student,Q5_5,20,Spatial analysis models and methods,NA
+R_2fdhgw8wozW3afw,I have used tidymodels packages many times,I am a student,Q5_6,40,Better serialization tools ,NA
+R_2fdhgw8wozW3afw,I have used tidymodels packages many times,I am a student,Q5_10,5,H2O.ai support ,NA
+R_2fdhgw8wozW3afw,I have used tidymodels packages many times,I am a student,Q5_12,0,Other,NA
+R_2zYgOHRifT08yFl,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_1,10,Model fairness analysis and metrics,NA
+R_2zYgOHRifT08yFl,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_2,30,Supervised feature selection,NA
+R_2zYgOHRifT08yFl,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_3,10,Probability calibration (post modeling),NA
+R_2zYgOHRifT08yFl,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_4,20,Probability threshold optimization,NA
+R_2zYgOHRifT08yFl,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_5,0,Spatial analysis models and methods,NA
+R_2zYgOHRifT08yFl,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_6,30,Better serialization tools ,NA
+R_2zYgOHRifT08yFl,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_10,0,H2O.ai support ,NA
+R_2zYgOHRifT08yFl,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_12,0,Other,NA
+R_1LFMWHnvvABFRz4,I have used tidymodels packages a few times,I am a hobbyist,Q5_1,0,Model fairness analysis and metrics,NA
+R_1LFMWHnvvABFRz4,I have used tidymodels packages a few times,I am a hobbyist,Q5_2,25,Supervised feature selection,NA
+R_1LFMWHnvvABFRz4,I have used tidymodels packages a few times,I am a hobbyist,Q5_3,0,Probability calibration (post modeling),NA
+R_1LFMWHnvvABFRz4,I have used tidymodels packages a few times,I am a hobbyist,Q5_4,0,Probability threshold optimization,NA
+R_1LFMWHnvvABFRz4,I have used tidymodels packages a few times,I am a hobbyist,Q5_5,25,Spatial analysis models and methods,NA
+R_1LFMWHnvvABFRz4,I have used tidymodels packages a few times,I am a hobbyist,Q5_6,50,Better serialization tools ,NA
+R_1LFMWHnvvABFRz4,I have used tidymodels packages a few times,I am a hobbyist,Q5_10,0,H2O.ai support ,NA
+R_1LFMWHnvvABFRz4,I have used tidymodels packages a few times,I am a hobbyist,Q5_12,0,Other,NA
+R_2c0o5kzWwz70QOe,I have used tidymodels packages a few times,I am a student,Q5_1,0,Model fairness analysis and metrics,NA
+R_2c0o5kzWwz70QOe,I have used tidymodels packages a few times,I am a student,Q5_2,0,Supervised feature selection,NA
+R_2c0o5kzWwz70QOe,I have used tidymodels packages a few times,I am a student,Q5_3,40,Probability calibration (post modeling),NA
+R_2c0o5kzWwz70QOe,I have used tidymodels packages a few times,I am a student,Q5_4,15,Probability threshold optimization,NA
+R_2c0o5kzWwz70QOe,I have used tidymodels packages a few times,I am a student,Q5_5,5,Spatial analysis models and methods,NA
+R_2c0o5kzWwz70QOe,I have used tidymodels packages a few times,I am a student,Q5_6,0,Better serialization tools ,NA
+R_2c0o5kzWwz70QOe,I have used tidymodels packages a few times,I am a student,Q5_10,0,H2O.ai support ,NA
+R_2c0o5kzWwz70QOe,I have used tidymodels packages a few times,I am a student,Q5_12,40,Other,Bayesian model integration
+R_Ajj6n2KDxdaKwnf,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_1,0,Model fairness analysis and metrics,NA
+R_Ajj6n2KDxdaKwnf,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_2,0,Supervised feature selection,NA
+R_Ajj6n2KDxdaKwnf,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_3,100,Probability calibration (post modeling),NA
+R_Ajj6n2KDxdaKwnf,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_4,0,Probability threshold optimization,NA
+R_Ajj6n2KDxdaKwnf,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_5,0,Spatial analysis models and methods,NA
+R_Ajj6n2KDxdaKwnf,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_6,0,Better serialization tools ,NA
+R_Ajj6n2KDxdaKwnf,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_10,0,H2O.ai support ,NA
+R_Ajj6n2KDxdaKwnf,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_12,0,Other,NA
+R_1M6rm9lp3J8whNP,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_1,10,Model fairness analysis and metrics,NA
+R_1M6rm9lp3J8whNP,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_2,10,Supervised feature selection,NA
+R_1M6rm9lp3J8whNP,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_3,30,Probability calibration (post modeling),NA
+R_1M6rm9lp3J8whNP,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_4,10,Probability threshold optimization,NA
+R_1M6rm9lp3J8whNP,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_5,20,Spatial analysis models and methods,NA
+R_1M6rm9lp3J8whNP,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_6,10,Better serialization tools ,NA
+R_1M6rm9lp3J8whNP,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_10,10,H2O.ai support ,NA
+R_1M6rm9lp3J8whNP,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_12,0,Other,NA
+R_8wyrPKO4wcQfDiN,I have used tidymodels packages many times,I work in industry,Q5_1,0,Model fairness analysis and metrics,NA
+R_8wyrPKO4wcQfDiN,I have used tidymodels packages many times,I work in industry,Q5_2,30,Supervised feature selection,NA
+R_8wyrPKO4wcQfDiN,I have used tidymodels packages many times,I work in industry,Q5_3,10,Probability calibration (post modeling),NA
+R_8wyrPKO4wcQfDiN,I have used tidymodels packages many times,I work in industry,Q5_4,10,Probability threshold optimization,NA
+R_8wyrPKO4wcQfDiN,I have used tidymodels packages many times,I work in industry,Q5_5,10,Spatial analysis models and methods,NA
+R_8wyrPKO4wcQfDiN,I have used tidymodels packages many times,I work in industry,Q5_6,0,Better serialization tools ,NA
+R_8wyrPKO4wcQfDiN,I have used tidymodels packages many times,I work in industry,Q5_10,20,H2O.ai support ,NA
+R_8wyrPKO4wcQfDiN,I have used tidymodels packages many times,I work in industry,Q5_12,20,Other,Tuning history management packages such as Python's wandb package
+R_2zTsw0sz8YEbcaB,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_1,0,Model fairness analysis and metrics,NA
+R_2zTsw0sz8YEbcaB,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_2,40,Supervised feature selection,NA
+R_2zTsw0sz8YEbcaB,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_3,0,Probability calibration (post modeling),NA
+R_2zTsw0sz8YEbcaB,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_4,0,Probability threshold optimization,NA
+R_2zTsw0sz8YEbcaB,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_5,15,Spatial analysis models and methods,NA
+R_2zTsw0sz8YEbcaB,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_6,15,Better serialization tools ,NA
+R_2zTsw0sz8YEbcaB,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_10,30,H2O.ai support ,NA
+R_2zTsw0sz8YEbcaB,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_12,0,Other,NA
+R_1f1kPNOW4NCl01j,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_1,20,Model fairness analysis and metrics,NA
+R_1f1kPNOW4NCl01j,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_2,20,Supervised feature selection,NA
+R_1f1kPNOW4NCl01j,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_3,15,Probability calibration (post modeling),NA
+R_1f1kPNOW4NCl01j,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_4,5,Probability threshold optimization,NA
+R_1f1kPNOW4NCl01j,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_5,15,Spatial analysis models and methods,NA
+R_1f1kPNOW4NCl01j,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_6,10,Better serialization tools ,NA
+R_1f1kPNOW4NCl01j,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_10,15,H2O.ai support ,NA
+R_1f1kPNOW4NCl01j,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_12,0,Other,NA
+R_1mI2DLckNhSwor3,I have used tidymodels packages a few times,I am a hobbyist,Q5_1,30,Model fairness analysis and metrics,NA
+R_1mI2DLckNhSwor3,I have used tidymodels packages a few times,I am a hobbyist,Q5_2,10,Supervised feature selection,NA
+R_1mI2DLckNhSwor3,I have used tidymodels packages a few times,I am a hobbyist,Q5_3,10,Probability calibration (post modeling),NA
+R_1mI2DLckNhSwor3,I have used tidymodels packages a few times,I am a hobbyist,Q5_4,5,Probability threshold optimization,NA
+R_1mI2DLckNhSwor3,I have used tidymodels packages a few times,I am a hobbyist,Q5_5,10,Spatial analysis models and methods,NA
+R_1mI2DLckNhSwor3,I have used tidymodels packages a few times,I am a hobbyist,Q5_6,10,Better serialization tools ,NA
+R_1mI2DLckNhSwor3,I have used tidymodels packages a few times,I am a hobbyist,Q5_10,25,H2O.ai support ,NA
+R_1mI2DLckNhSwor3,I have used tidymodels packages a few times,I am a hobbyist,Q5_12,0,Other,NA
+R_1n2EibyY0eBHwxP,I have used tidymodels packages many times,I work in industry,Q5_1,10,Model fairness analysis and metrics,NA
+R_1n2EibyY0eBHwxP,I have used tidymodels packages many times,I work in industry,Q5_2,30,Supervised feature selection,NA
+R_1n2EibyY0eBHwxP,I have used tidymodels packages many times,I work in industry,Q5_3,0,Probability calibration (post modeling),NA
+R_1n2EibyY0eBHwxP,I have used tidymodels packages many times,I work in industry,Q5_4,40,Probability threshold optimization,NA
+R_1n2EibyY0eBHwxP,I have used tidymodels packages many times,I work in industry,Q5_5,0,Spatial analysis models and methods,NA
+R_1n2EibyY0eBHwxP,I have used tidymodels packages many times,I work in industry,Q5_6,20,Better serialization tools ,NA
+R_1n2EibyY0eBHwxP,I have used tidymodels packages many times,I work in industry,Q5_10,0,H2O.ai support ,NA
+R_1n2EibyY0eBHwxP,I have used tidymodels packages many times,I work in industry,Q5_12,0,Other,NA
+R_2sSGzu3GDDGYWSj,I have used tidymodels packages a few times,I work in industry,Q5_1,10,Model fairness analysis and metrics,NA
+R_2sSGzu3GDDGYWSj,I have used tidymodels packages a few times,I work in industry,Q5_2,25,Supervised feature selection,NA
+R_2sSGzu3GDDGYWSj,I have used tidymodels packages a few times,I work in industry,Q5_3,5,Probability calibration (post modeling),NA
+R_2sSGzu3GDDGYWSj,I have used tidymodels packages a few times,I work in industry,Q5_4,5,Probability threshold optimization,NA
+R_2sSGzu3GDDGYWSj,I have used tidymodels packages a few times,I work in industry,Q5_5,25,Spatial analysis models and methods,NA
+R_2sSGzu3GDDGYWSj,I have used tidymodels packages a few times,I work in industry,Q5_6,10,Better serialization tools ,NA
+R_2sSGzu3GDDGYWSj,I have used tidymodels packages a few times,I work in industry,Q5_10,0,H2O.ai support ,NA
+R_2sSGzu3GDDGYWSj,I have used tidymodels packages a few times,I work in industry,Q5_12,20,Other,Educational cources
+R_3NIqKnGYa4m6jfS,I have used tidymodels packages many times,I work in industry,Q5_1,0,Model fairness analysis and metrics,NA
+R_3NIqKnGYa4m6jfS,I have used tidymodels packages many times,I work in industry,Q5_2,40,Supervised feature selection,NA
+R_3NIqKnGYa4m6jfS,I have used tidymodels packages many times,I work in industry,Q5_3,0,Probability calibration (post modeling),NA
+R_3NIqKnGYa4m6jfS,I have used tidymodels packages many times,I work in industry,Q5_4,40,Probability threshold optimization,NA
+R_3NIqKnGYa4m6jfS,I have used tidymodels packages many times,I work in industry,Q5_5,0,Spatial analysis models and methods,NA
+R_3NIqKnGYa4m6jfS,I have used tidymodels packages many times,I work in industry,Q5_6,0,Better serialization tools ,NA
+R_3NIqKnGYa4m6jfS,I have used tidymodels packages many times,I work in industry,Q5_10,0,H2O.ai support ,NA
+R_3NIqKnGYa4m6jfS,I have used tidymodels packages many times,I work in industry,Q5_12,20,Other,NA
+R_3elZXuUGTnNrc0R,I have used tidymodels packages a few times,I work in industry,Q5_1,0,Model fairness analysis and metrics,NA
+R_3elZXuUGTnNrc0R,I have used tidymodels packages a few times,I work in industry,Q5_2,0,Supervised feature selection,NA
+R_3elZXuUGTnNrc0R,I have used tidymodels packages a few times,I work in industry,Q5_3,0,Probability calibration (post modeling),NA
+R_3elZXuUGTnNrc0R,I have used tidymodels packages a few times,I work in industry,Q5_4,0,Probability threshold optimization,NA
+R_3elZXuUGTnNrc0R,I have used tidymodels packages a few times,I work in industry,Q5_5,100,Spatial analysis models and methods,NA
+R_3elZXuUGTnNrc0R,I have used tidymodels packages a few times,I work in industry,Q5_6,0,Better serialization tools ,NA
+R_3elZXuUGTnNrc0R,I have used tidymodels packages a few times,I work in industry,Q5_10,0,H2O.ai support ,NA
+R_3elZXuUGTnNrc0R,I have used tidymodels packages a few times,I work in industry,Q5_12,0,Other,NA
+R_Aj4swMpkLtxoSlj,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_1,0,Model fairness analysis and metrics,NA
+R_Aj4swMpkLtxoSlj,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_2,30,Supervised feature selection,NA
+R_Aj4swMpkLtxoSlj,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_3,0,Probability calibration (post modeling),NA
+R_Aj4swMpkLtxoSlj,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_4,30,Probability threshold optimization,NA
+R_Aj4swMpkLtxoSlj,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_5,0,Spatial analysis models and methods,NA
+R_Aj4swMpkLtxoSlj,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_6,0,Better serialization tools ,NA
+R_Aj4swMpkLtxoSlj,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_10,0,H2O.ai support ,NA
+R_Aj4swMpkLtxoSlj,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_12,40,Other,More diverse tools related to cluster analysis and related diagnostics
+R_3FJoDd74gBrBIGR,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_1,25,Model fairness analysis and metrics,NA
+R_3FJoDd74gBrBIGR,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_2,25,Supervised feature selection,NA
+R_3FJoDd74gBrBIGR,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_3,0,Probability calibration (post modeling),NA
+R_3FJoDd74gBrBIGR,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_4,25,Probability threshold optimization,NA
+R_3FJoDd74gBrBIGR,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_5,0,Spatial analysis models and methods,NA
+R_3FJoDd74gBrBIGR,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_6,25,Better serialization tools ,NA
+R_3FJoDd74gBrBIGR,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_10,0,H2O.ai support ,NA
+R_3FJoDd74gBrBIGR,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_12,0,Other,NA
+R_2vi6KP09vtXEmJe,I have used tidymodels packages a few times,I work in industry,Q5_1,0,Model fairness analysis and metrics,NA
+R_2vi6KP09vtXEmJe,I have used tidymodels packages a few times,I work in industry,Q5_2,50,Supervised feature selection,NA
+R_2vi6KP09vtXEmJe,I have used tidymodels packages a few times,I work in industry,Q5_3,10,Probability calibration (post modeling),NA
+R_2vi6KP09vtXEmJe,I have used tidymodels packages a few times,I work in industry,Q5_4,30,Probability threshold optimization,NA
+R_2vi6KP09vtXEmJe,I have used tidymodels packages a few times,I work in industry,Q5_5,10,Spatial analysis models and methods,NA
+R_2vi6KP09vtXEmJe,I have used tidymodels packages a few times,I work in industry,Q5_6,0,Better serialization tools ,NA
+R_2vi6KP09vtXEmJe,I have used tidymodels packages a few times,I work in industry,Q5_10,0,H2O.ai support ,NA
+R_2vi6KP09vtXEmJe,I have used tidymodels packages a few times,I work in industry,Q5_12,0,Other,NA
+R_1q9CSSwQ75Kj7xc,I have used tidymodels packages many times,I work in industry,Q5_1,20,Model fairness analysis and metrics,NA
+R_1q9CSSwQ75Kj7xc,I have used tidymodels packages many times,I work in industry,Q5_2,20,Supervised feature selection,NA
+R_1q9CSSwQ75Kj7xc,I have used tidymodels packages many times,I work in industry,Q5_3,20,Probability calibration (post modeling),NA
+R_1q9CSSwQ75Kj7xc,I have used tidymodels packages many times,I work in industry,Q5_4,0,Probability threshold optimization,NA
+R_1q9CSSwQ75Kj7xc,I have used tidymodels packages many times,I work in industry,Q5_5,20,Spatial analysis models and methods,NA
+R_1q9CSSwQ75Kj7xc,I have used tidymodels packages many times,I work in industry,Q5_6,10,Better serialization tools ,NA
+R_1q9CSSwQ75Kj7xc,I have used tidymodels packages many times,I work in industry,Q5_10,10,H2O.ai support ,NA
+R_1q9CSSwQ75Kj7xc,I have used tidymodels packages many times,I work in industry,Q5_12,0,Other,NA
+R_3j3g0aSFuERSJ6N,I have used tidymodels packages a few times,I work in industry,Q5_1,20,Model fairness analysis and metrics,NA
+R_3j3g0aSFuERSJ6N,I have used tidymodels packages a few times,I work in industry,Q5_2,20,Supervised feature selection,NA
+R_3j3g0aSFuERSJ6N,I have used tidymodels packages a few times,I work in industry,Q5_3,30,Probability calibration (post modeling),NA
+R_3j3g0aSFuERSJ6N,I have used tidymodels packages a few times,I work in industry,Q5_4,5,Probability threshold optimization,NA
+R_3j3g0aSFuERSJ6N,I have used tidymodels packages a few times,I work in industry,Q5_5,5,Spatial analysis models and methods,NA
+R_3j3g0aSFuERSJ6N,I have used tidymodels packages a few times,I work in industry,Q5_6,10,Better serialization tools ,NA
+R_3j3g0aSFuERSJ6N,I have used tidymodels packages a few times,I work in industry,Q5_10,10,H2O.ai support ,NA
+R_3j3g0aSFuERSJ6N,I have used tidymodels packages a few times,I work in industry,Q5_12,0,Other,NA
+R_2VdnjKdCOrfbxLO,I have used tidymodels packages many times,I work in industry,Q5_1,50,Model fairness analysis and metrics,NA
+R_2VdnjKdCOrfbxLO,I have used tidymodels packages many times,I work in industry,Q5_2,45,Supervised feature selection,NA
+R_2VdnjKdCOrfbxLO,I have used tidymodels packages many times,I work in industry,Q5_3,0,Probability calibration (post modeling),NA
+R_2VdnjKdCOrfbxLO,I have used tidymodels packages many times,I work in industry,Q5_4,0,Probability threshold optimization,NA
+R_2VdnjKdCOrfbxLO,I have used tidymodels packages many times,I work in industry,Q5_5,0,Spatial analysis models and methods,NA
+R_2VdnjKdCOrfbxLO,I have used tidymodels packages many times,I work in industry,Q5_6,5,Better serialization tools ,NA
+R_2VdnjKdCOrfbxLO,I have used tidymodels packages many times,I work in industry,Q5_10,0,H2O.ai support ,NA
+R_2VdnjKdCOrfbxLO,I have used tidymodels packages many times,I work in industry,Q5_12,0,Other,NA
+R_DxdC5NEkG0ygPap,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_1,0,Model fairness analysis and metrics,NA
+R_DxdC5NEkG0ygPap,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_2,20,Supervised feature selection,NA
+R_DxdC5NEkG0ygPap,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_3,30,Probability calibration (post modeling),NA
+R_DxdC5NEkG0ygPap,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_4,0,Probability threshold optimization,NA
+R_DxdC5NEkG0ygPap,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_5,20,Spatial analysis models and methods,NA
+R_DxdC5NEkG0ygPap,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_6,30,Better serialization tools ,NA
+R_DxdC5NEkG0ygPap,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_10,0,H2O.ai support ,NA
+R_DxdC5NEkG0ygPap,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_12,0,Other,NA
+R_UKBJLMP2wyjPKut,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_1,0,Model fairness analysis and metrics,NA
+R_UKBJLMP2wyjPKut,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_2,20,Supervised feature selection,NA
+R_UKBJLMP2wyjPKut,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_3,0,Probability calibration (post modeling),NA
+R_UKBJLMP2wyjPKut,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_4,0,Probability threshold optimization,NA
+R_UKBJLMP2wyjPKut,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_5,0,Spatial analysis models and methods,NA
+R_UKBJLMP2wyjPKut,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_6,0,Better serialization tools ,NA
+R_UKBJLMP2wyjPKut,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_10,0,H2O.ai support ,NA
+R_UKBJLMP2wyjPKut,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_12,80,Other,tensorflow
+R_10C0RvWWavJGH6k,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_1,20,Model fairness analysis and metrics,NA
+R_10C0RvWWavJGH6k,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_2,0,Supervised feature selection,NA
+R_10C0RvWWavJGH6k,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_3,0,Probability calibration (post modeling),NA
+R_10C0RvWWavJGH6k,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_4,20,Probability threshold optimization,NA
+R_10C0RvWWavJGH6k,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_5,10,Spatial analysis models and methods,NA
+R_10C0RvWWavJGH6k,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_6,40,Better serialization tools ,NA
+R_10C0RvWWavJGH6k,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_10,0,H2O.ai support ,NA
+R_10C0RvWWavJGH6k,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_12,10,Other,better parallel computing support
+R_ZIS7Jkxqb8hl9h7,I have used tidymodels packages a few times,I work in industry,Q5_1,0,Model fairness analysis and metrics,NA
+R_ZIS7Jkxqb8hl9h7,I have used tidymodels packages a few times,I work in industry,Q5_2,40,Supervised feature selection,NA
+R_ZIS7Jkxqb8hl9h7,I have used tidymodels packages a few times,I work in industry,Q5_3,0,Probability calibration (post modeling),NA
+R_ZIS7Jkxqb8hl9h7,I have used tidymodels packages a few times,I work in industry,Q5_4,40,Probability threshold optimization,NA
+R_ZIS7Jkxqb8hl9h7,I have used tidymodels packages a few times,I work in industry,Q5_5,20,Spatial analysis models and methods,NA
+R_ZIS7Jkxqb8hl9h7,I have used tidymodels packages a few times,I work in industry,Q5_6,0,Better serialization tools ,NA
+R_ZIS7Jkxqb8hl9h7,I have used tidymodels packages a few times,I work in industry,Q5_10,0,H2O.ai support ,NA
+R_ZIS7Jkxqb8hl9h7,I have used tidymodels packages a few times,I work in industry,Q5_12,0,Other,NA
+R_1pFnWd0rLCw98rE,I have used tidymodels packages a few times,I am a student,Q5_1,20,Model fairness analysis and metrics,NA
+R_1pFnWd0rLCw98rE,I have used tidymodels packages a few times,I am a student,Q5_2,30,Supervised feature selection,NA
+R_1pFnWd0rLCw98rE,I have used tidymodels packages a few times,I am a student,Q5_3,5,Probability calibration (post modeling),NA
+R_1pFnWd0rLCw98rE,I have used tidymodels packages a few times,I am a student,Q5_4,5,Probability threshold optimization,NA
+R_1pFnWd0rLCw98rE,I have used tidymodels packages a few times,I am a student,Q5_5,20,Spatial analysis models and methods,NA
+R_1pFnWd0rLCw98rE,I have used tidymodels packages a few times,I am a student,Q5_6,10,Better serialization tools ,NA
+R_1pFnWd0rLCw98rE,I have used tidymodels packages a few times,I am a student,Q5_10,10,H2O.ai support ,NA
+R_1pFnWd0rLCw98rE,I have used tidymodels packages a few times,I am a student,Q5_12,0,Other,NA
+R_2dFljCeYLqEzQz1,I have used tidymodels packages a few times,I work in industry,Q5_1,25,Model fairness analysis and metrics,NA
+R_2dFljCeYLqEzQz1,I have used tidymodels packages a few times,I work in industry,Q5_2,5,Supervised feature selection,NA
+R_2dFljCeYLqEzQz1,I have used tidymodels packages a few times,I work in industry,Q5_3,5,Probability calibration (post modeling),NA
+R_2dFljCeYLqEzQz1,I have used tidymodels packages a few times,I work in industry,Q5_4,5,Probability threshold optimization,NA
+R_2dFljCeYLqEzQz1,I have used tidymodels packages a few times,I work in industry,Q5_5,0,Spatial analysis models and methods,NA
+R_2dFljCeYLqEzQz1,I have used tidymodels packages a few times,I work in industry,Q5_6,50,Better serialization tools ,NA
+R_2dFljCeYLqEzQz1,I have used tidymodels packages a few times,I work in industry,Q5_10,10,H2O.ai support ,NA
+R_2dFljCeYLqEzQz1,I have used tidymodels packages a few times,I work in industry,Q5_12,0,Other,NA
+R_2eXry7IQkr7ivTm,I have used tidymodels packages many times,I work in industry,Q5_1,0,Model fairness analysis and metrics,NA
+R_2eXry7IQkr7ivTm,I have used tidymodels packages many times,I work in industry,Q5_2,15,Supervised feature selection,NA
+R_2eXry7IQkr7ivTm,I have used tidymodels packages many times,I work in industry,Q5_3,20,Probability calibration (post modeling),NA
+R_2eXry7IQkr7ivTm,I have used tidymodels packages many times,I work in industry,Q5_4,20,Probability threshold optimization,NA
+R_2eXry7IQkr7ivTm,I have used tidymodels packages many times,I work in industry,Q5_5,0,Spatial analysis models and methods,NA
+R_2eXry7IQkr7ivTm,I have used tidymodels packages many times,I work in industry,Q5_6,15,Better serialization tools ,NA
+R_2eXry7IQkr7ivTm,I have used tidymodels packages many times,I work in industry,Q5_10,30,H2O.ai support ,NA
+R_2eXry7IQkr7ivTm,I have used tidymodels packages many times,I work in industry,Q5_12,0,Other,NA
+R_stKzwwk26mRKlLr,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_1,30,Model fairness analysis and metrics,NA
+R_stKzwwk26mRKlLr,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_2,35,Supervised feature selection,NA
+R_stKzwwk26mRKlLr,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_3,10,Probability calibration (post modeling),NA
+R_stKzwwk26mRKlLr,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_4,20,Probability threshold optimization,NA
+R_stKzwwk26mRKlLr,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_5,0,Spatial analysis models and methods,NA
+R_stKzwwk26mRKlLr,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_6,0,Better serialization tools ,NA
+R_stKzwwk26mRKlLr,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_10,5,H2O.ai support ,NA
+R_stKzwwk26mRKlLr,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_12,0,Other,NA
+R_2EfWAr8AhexSgnm,I have used tidymodels packages many times,I work in industry,Q5_1,0,Model fairness analysis and metrics,NA
+R_2EfWAr8AhexSgnm,I have used tidymodels packages many times,I work in industry,Q5_2,5,Supervised feature selection,NA
+R_2EfWAr8AhexSgnm,I have used tidymodels packages many times,I work in industry,Q5_3,10,Probability calibration (post modeling),NA
+R_2EfWAr8AhexSgnm,I have used tidymodels packages many times,I work in industry,Q5_4,0,Probability threshold optimization,NA
+R_2EfWAr8AhexSgnm,I have used tidymodels packages many times,I work in industry,Q5_5,50,Spatial analysis models and methods,NA
+R_2EfWAr8AhexSgnm,I have used tidymodels packages many times,I work in industry,Q5_6,25,Better serialization tools ,NA
+R_2EfWAr8AhexSgnm,I have used tidymodels packages many times,I work in industry,Q5_10,10,H2O.ai support ,NA
+R_2EfWAr8AhexSgnm,I have used tidymodels packages many times,I work in industry,Q5_12,0,Other,NA
+R_6zHE5v0P4uv77bP,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_1,0,Model fairness analysis and metrics,NA
+R_6zHE5v0P4uv77bP,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_2,50,Supervised feature selection,NA
+R_6zHE5v0P4uv77bP,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_3,15,Probability calibration (post modeling),NA
+R_6zHE5v0P4uv77bP,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_4,25,Probability threshold optimization,NA
+R_6zHE5v0P4uv77bP,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_5,10,Spatial analysis models and methods,NA
+R_6zHE5v0P4uv77bP,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_6,0,Better serialization tools ,NA
+R_6zHE5v0P4uv77bP,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_10,0,H2O.ai support ,NA
+R_6zHE5v0P4uv77bP,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_12,0,Other,NA
+R_3qWga1EeGXcn9Wt,I have used tidymodels packages many times,I am a hobbyist,Q5_1,10,Model fairness analysis and metrics,NA
+R_3qWga1EeGXcn9Wt,I have used tidymodels packages many times,I am a hobbyist,Q5_2,10,Supervised feature selection,NA
+R_3qWga1EeGXcn9Wt,I have used tidymodels packages many times,I am a hobbyist,Q5_3,10,Probability calibration (post modeling),NA
+R_3qWga1EeGXcn9Wt,I have used tidymodels packages many times,I am a hobbyist,Q5_4,0,Probability threshold optimization,NA
+R_3qWga1EeGXcn9Wt,I have used tidymodels packages many times,I am a hobbyist,Q5_5,0,Spatial analysis models and methods,NA
+R_3qWga1EeGXcn9Wt,I have used tidymodels packages many times,I am a hobbyist,Q5_6,0,Better serialization tools ,NA
+R_3qWga1EeGXcn9Wt,I have used tidymodels packages many times,I am a hobbyist,Q5_10,0,H2O.ai support ,NA
+R_3qWga1EeGXcn9Wt,I have used tidymodels packages many times,I am a hobbyist,Q5_12,70,Other,"Bayesian Modelling e.g., Multilevel"
+R_3RdQQc2c5Gunxoi,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_1,0,Model fairness analysis and metrics,NA
+R_3RdQQc2c5Gunxoi,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_2,50,Supervised feature selection,NA
+R_3RdQQc2c5Gunxoi,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_3,0,Probability calibration (post modeling),NA
+R_3RdQQc2c5Gunxoi,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_4,0,Probability threshold optimization,NA
+R_3RdQQc2c5Gunxoi,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_5,50,Spatial analysis models and methods,NA
+R_3RdQQc2c5Gunxoi,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_6,0,Better serialization tools ,NA
+R_3RdQQc2c5Gunxoi,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_10,0,H2O.ai support ,NA
+R_3RdQQc2c5Gunxoi,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_12,0,Other,NA
+R_31ntgmTWQO42Frt,I have used tidymodels packages many times,I work in industry,Q5_1,0,Model fairness analysis and metrics,NA
+R_31ntgmTWQO42Frt,I have used tidymodels packages many times,I work in industry,Q5_2,30,Supervised feature selection,NA
+R_31ntgmTWQO42Frt,I have used tidymodels packages many times,I work in industry,Q5_3,30,Probability calibration (post modeling),NA
+R_31ntgmTWQO42Frt,I have used tidymodels packages many times,I work in industry,Q5_4,10,Probability threshold optimization,NA
+R_31ntgmTWQO42Frt,I have used tidymodels packages many times,I work in industry,Q5_5,0,Spatial analysis models and methods,NA
+R_31ntgmTWQO42Frt,I have used tidymodels packages many times,I work in industry,Q5_6,30,Better serialization tools ,NA
+R_31ntgmTWQO42Frt,I have used tidymodels packages many times,I work in industry,Q5_10,0,H2O.ai support ,NA
+R_31ntgmTWQO42Frt,I have used tidymodels packages many times,I work in industry,Q5_12,0,Other,NA
+R_1QnkNRNhnA9NRYf,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_1,5,Model fairness analysis and metrics,NA
+R_1QnkNRNhnA9NRYf,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_2,5,Supervised feature selection,NA
+R_1QnkNRNhnA9NRYf,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_3,20,Probability calibration (post modeling),NA
+R_1QnkNRNhnA9NRYf,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_4,15,Probability threshold optimization,NA
+R_1QnkNRNhnA9NRYf,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_5,40,Spatial analysis models and methods,NA
+R_1QnkNRNhnA9NRYf,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_6,10,Better serialization tools ,NA
+R_1QnkNRNhnA9NRYf,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_10,5,H2O.ai support ,NA
+R_1QnkNRNhnA9NRYf,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_12,0,Other,NA
+R_1Nnv4O7QjW0XJkM,I have used tidymodels packages many times,I work in industry,Q5_1,0,Model fairness analysis and metrics,NA
+R_1Nnv4O7QjW0XJkM,I have used tidymodels packages many times,I work in industry,Q5_2,65,Supervised feature selection,NA
+R_1Nnv4O7QjW0XJkM,I have used tidymodels packages many times,I work in industry,Q5_3,0,Probability calibration (post modeling),NA
+R_1Nnv4O7QjW0XJkM,I have used tidymodels packages many times,I work in industry,Q5_4,10,Probability threshold optimization,NA
+R_1Nnv4O7QjW0XJkM,I have used tidymodels packages many times,I work in industry,Q5_5,25,Spatial analysis models and methods,NA
+R_1Nnv4O7QjW0XJkM,I have used tidymodels packages many times,I work in industry,Q5_6,0,Better serialization tools ,NA
+R_1Nnv4O7QjW0XJkM,I have used tidymodels packages many times,I work in industry,Q5_10,0,H2O.ai support ,NA
+R_1Nnv4O7QjW0XJkM,I have used tidymodels packages many times,I work in industry,Q5_12,0,Other,NA
+R_2rClIIAj6E42qOZ,I have used tidymodels packages a few times,I am a student,Q5_1,0,Model fairness analysis and metrics,NA
+R_2rClIIAj6E42qOZ,I have used tidymodels packages a few times,I am a student,Q5_2,0,Supervised feature selection,NA
+R_2rClIIAj6E42qOZ,I have used tidymodels packages a few times,I am a student,Q5_3,20,Probability calibration (post modeling),NA
+R_2rClIIAj6E42qOZ,I have used tidymodels packages a few times,I am a student,Q5_4,20,Probability threshold optimization,NA
+R_2rClIIAj6E42qOZ,I have used tidymodels packages a few times,I am a student,Q5_5,10,Spatial analysis models and methods,NA
+R_2rClIIAj6E42qOZ,I have used tidymodels packages a few times,I am a student,Q5_6,0,Better serialization tools ,NA
+R_2rClIIAj6E42qOZ,I have used tidymodels packages a few times,I am a student,Q5_10,0,H2O.ai support ,NA
+R_2rClIIAj6E42qOZ,I have used tidymodels packages a few times,I am a student,Q5_12,50,Other,Verifying model assumptions
+R_1d1eupiMuyhnc6E,I have used tidymodels packages many times,I work in industry,Q5_1,15,Model fairness analysis and metrics,NA
+R_1d1eupiMuyhnc6E,I have used tidymodels packages many times,I work in industry,Q5_2,0,Supervised feature selection,NA
+R_1d1eupiMuyhnc6E,I have used tidymodels packages many times,I work in industry,Q5_3,10,Probability calibration (post modeling),NA
+R_1d1eupiMuyhnc6E,I have used tidymodels packages many times,I work in industry,Q5_4,0,Probability threshold optimization,NA
+R_1d1eupiMuyhnc6E,I have used tidymodels packages many times,I work in industry,Q5_5,0,Spatial analysis models and methods,NA
+R_1d1eupiMuyhnc6E,I have used tidymodels packages many times,I work in industry,Q5_6,30,Better serialization tools ,NA
+R_1d1eupiMuyhnc6E,I have used tidymodels packages many times,I work in industry,Q5_10,35,H2O.ai support ,NA
+R_1d1eupiMuyhnc6E,I have used tidymodels packages many times,I work in industry,Q5_12,10,Other,NA
+R_3M6xKTiVNFDyv2q,I have used tidymodels packages a few times,I work in industry,Q5_1,50,Model fairness analysis and metrics,NA
+R_3M6xKTiVNFDyv2q,I have used tidymodels packages a few times,I work in industry,Q5_2,10,Supervised feature selection,NA
+R_3M6xKTiVNFDyv2q,I have used tidymodels packages a few times,I work in industry,Q5_3,0,Probability calibration (post modeling),NA
+R_3M6xKTiVNFDyv2q,I have used tidymodels packages a few times,I work in industry,Q5_4,15,Probability threshold optimization,NA
+R_3M6xKTiVNFDyv2q,I have used tidymodels packages a few times,I work in industry,Q5_5,25,Spatial analysis models and methods,NA
+R_3M6xKTiVNFDyv2q,I have used tidymodels packages a few times,I work in industry,Q5_6,0,Better serialization tools ,NA
+R_3M6xKTiVNFDyv2q,I have used tidymodels packages a few times,I work in industry,Q5_10,0,H2O.ai support ,NA
+R_3M6xKTiVNFDyv2q,I have used tidymodels packages a few times,I work in industry,Q5_12,0,Other,NA
+R_6mwXEdEwsOuQtVL,I have used tidymodels packages many times,I am a student,Q5_1,5,Model fairness analysis and metrics,NA
+R_6mwXEdEwsOuQtVL,I have used tidymodels packages many times,I am a student,Q5_2,10,Supervised feature selection,NA
+R_6mwXEdEwsOuQtVL,I have used tidymodels packages many times,I am a student,Q5_3,10,Probability calibration (post modeling),NA
+R_6mwXEdEwsOuQtVL,I have used tidymodels packages many times,I am a student,Q5_4,30,Probability threshold optimization,NA
+R_6mwXEdEwsOuQtVL,I have used tidymodels packages many times,I am a student,Q5_5,10,Spatial analysis models and methods,NA
+R_6mwXEdEwsOuQtVL,I have used tidymodels packages many times,I am a student,Q5_6,10,Better serialization tools ,NA
+R_6mwXEdEwsOuQtVL,I have used tidymodels packages many times,I am a student,Q5_10,25,H2O.ai support ,NA
+R_6mwXEdEwsOuQtVL,I have used tidymodels packages many times,I am a student,Q5_12,0,Other,NA
+R_8IJactqO55BJuXD,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_1,50,Model fairness analysis and metrics,NA
+R_8IJactqO55BJuXD,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_2,0,Supervised feature selection,NA
+R_8IJactqO55BJuXD,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_3,0,Probability calibration (post modeling),NA
+R_8IJactqO55BJuXD,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_4,50,Probability threshold optimization,NA
+R_8IJactqO55BJuXD,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_5,0,Spatial analysis models and methods,NA
+R_8IJactqO55BJuXD,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_6,0,Better serialization tools ,NA
+R_8IJactqO55BJuXD,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_10,0,H2O.ai support ,NA
+R_8IJactqO55BJuXD,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_12,0,Other,NA
+R_3p9XsROiQH4CvFh,I have contributed to tidymodels packages or taught others how to use them,I am a student,Q5_1,15,Model fairness analysis and metrics,NA
+R_3p9XsROiQH4CvFh,I have contributed to tidymodels packages or taught others how to use them,I am a student,Q5_2,0,Supervised feature selection,NA
+R_3p9XsROiQH4CvFh,I have contributed to tidymodels packages or taught others how to use them,I am a student,Q5_3,10,Probability calibration (post modeling),NA
+R_3p9XsROiQH4CvFh,I have contributed to tidymodels packages or taught others how to use them,I am a student,Q5_4,0,Probability threshold optimization,NA
+R_3p9XsROiQH4CvFh,I have contributed to tidymodels packages or taught others how to use them,I am a student,Q5_5,20,Spatial analysis models and methods,NA
+R_3p9XsROiQH4CvFh,I have contributed to tidymodels packages or taught others how to use them,I am a student,Q5_6,20,Better serialization tools ,NA
+R_3p9XsROiQH4CvFh,I have contributed to tidymodels packages or taught others how to use them,I am a student,Q5_10,35,H2O.ai support ,NA
+R_3p9XsROiQH4CvFh,I have contributed to tidymodels packages or taught others how to use them,I am a student,Q5_12,0,Other,NA
+R_29ht2IFF4rVy9fn,I have used tidymodels packages many times,I work in industry,Q5_1,40,Model fairness analysis and metrics,NA
+R_29ht2IFF4rVy9fn,I have used tidymodels packages many times,I work in industry,Q5_2,10,Supervised feature selection,NA
+R_29ht2IFF4rVy9fn,I have used tidymodels packages many times,I work in industry,Q5_3,20,Probability calibration (post modeling),NA
+R_29ht2IFF4rVy9fn,I have used tidymodels packages many times,I work in industry,Q5_4,20,Probability threshold optimization,NA
+R_29ht2IFF4rVy9fn,I have used tidymodels packages many times,I work in industry,Q5_5,0,Spatial analysis models and methods,NA
+R_29ht2IFF4rVy9fn,I have used tidymodels packages many times,I work in industry,Q5_6,10,Better serialization tools ,NA
+R_29ht2IFF4rVy9fn,I have used tidymodels packages many times,I work in industry,Q5_10,0,H2O.ai support ,NA
+R_29ht2IFF4rVy9fn,I have used tidymodels packages many times,I work in industry,Q5_12,0,Other,NA
+R_1FhurqUEzjESVjO,I have contributed to tidymodels packages or taught others how to use them,"I am an academic, professor, and/or researcher",Q5_1,0,Model fairness analysis and metrics,NA
+R_1FhurqUEzjESVjO,I have contributed to tidymodels packages or taught others how to use them,"I am an academic, professor, and/or researcher",Q5_2,0,Supervised feature selection,NA
+R_1FhurqUEzjESVjO,I have contributed to tidymodels packages or taught others how to use them,"I am an academic, professor, and/or researcher",Q5_3,50,Probability calibration (post modeling),NA
+R_1FhurqUEzjESVjO,I have contributed to tidymodels packages or taught others how to use them,"I am an academic, professor, and/or researcher",Q5_4,0,Probability threshold optimization,NA
+R_1FhurqUEzjESVjO,I have contributed to tidymodels packages or taught others how to use them,"I am an academic, professor, and/or researcher",Q5_5,50,Spatial analysis models and methods,NA
+R_1FhurqUEzjESVjO,I have contributed to tidymodels packages or taught others how to use them,"I am an academic, professor, and/or researcher",Q5_6,0,Better serialization tools ,NA
+R_1FhurqUEzjESVjO,I have contributed to tidymodels packages or taught others how to use them,"I am an academic, professor, and/or researcher",Q5_10,0,H2O.ai support ,NA
+R_1FhurqUEzjESVjO,I have contributed to tidymodels packages or taught others how to use them,"I am an academic, professor, and/or researcher",Q5_12,0,Other,NA
+R_1gkargf1VzCwgll,I have used tidymodels packages a few times,I work in industry,Q5_1,10,Model fairness analysis and metrics,NA
+R_1gkargf1VzCwgll,I have used tidymodels packages a few times,I work in industry,Q5_2,20,Supervised feature selection,NA
+R_1gkargf1VzCwgll,I have used tidymodels packages a few times,I work in industry,Q5_3,0,Probability calibration (post modeling),NA
+R_1gkargf1VzCwgll,I have used tidymodels packages a few times,I work in industry,Q5_4,40,Probability threshold optimization,NA
+R_1gkargf1VzCwgll,I have used tidymodels packages a few times,I work in industry,Q5_5,10,Spatial analysis models and methods,NA
+R_1gkargf1VzCwgll,I have used tidymodels packages a few times,I work in industry,Q5_6,20,Better serialization tools ,NA
+R_1gkargf1VzCwgll,I have used tidymodels packages a few times,I work in industry,Q5_10,0,H2O.ai support ,NA
+R_1gkargf1VzCwgll,I have used tidymodels packages a few times,I work in industry,Q5_12,0,Other,NA
+R_3nJ02MWLJTeBmhB,I have used tidymodels packages a few times,I work in industry,Q5_1,10,Model fairness analysis and metrics,NA
+R_3nJ02MWLJTeBmhB,I have used tidymodels packages a few times,I work in industry,Q5_2,0,Supervised feature selection,NA
+R_3nJ02MWLJTeBmhB,I have used tidymodels packages a few times,I work in industry,Q5_3,30,Probability calibration (post modeling),NA
+R_3nJ02MWLJTeBmhB,I have used tidymodels packages a few times,I work in industry,Q5_4,30,Probability threshold optimization,NA
+R_3nJ02MWLJTeBmhB,I have used tidymodels packages a few times,I work in industry,Q5_5,0,Spatial analysis models and methods,NA
+R_3nJ02MWLJTeBmhB,I have used tidymodels packages a few times,I work in industry,Q5_6,30,Better serialization tools ,NA
+R_3nJ02MWLJTeBmhB,I have used tidymodels packages a few times,I work in industry,Q5_10,0,H2O.ai support ,NA
+R_3nJ02MWLJTeBmhB,I have used tidymodels packages a few times,I work in industry,Q5_12,0,Other,NA
+R_3NvOQEGhvBolEV3,I have used tidymodels packages many times,I work in industry,Q5_1,0,Model fairness analysis and metrics,NA
+R_3NvOQEGhvBolEV3,I have used tidymodels packages many times,I work in industry,Q5_2,50,Supervised feature selection,NA
+R_3NvOQEGhvBolEV3,I have used tidymodels packages many times,I work in industry,Q5_3,0,Probability calibration (post modeling),NA
+R_3NvOQEGhvBolEV3,I have used tidymodels packages many times,I work in industry,Q5_4,50,Probability threshold optimization,NA
+R_3NvOQEGhvBolEV3,I have used tidymodels packages many times,I work in industry,Q5_5,0,Spatial analysis models and methods,NA
+R_3NvOQEGhvBolEV3,I have used tidymodels packages many times,I work in industry,Q5_6,0,Better serialization tools ,NA
+R_3NvOQEGhvBolEV3,I have used tidymodels packages many times,I work in industry,Q5_10,0,H2O.ai support ,NA
+R_3NvOQEGhvBolEV3,I have used tidymodels packages many times,I work in industry,Q5_12,0,Other,NA
+R_3LYciGosWNIZIsM,I have used tidymodels packages many times,I work in industry,Q5_1,0,Model fairness analysis and metrics,NA
+R_3LYciGosWNIZIsM,I have used tidymodels packages many times,I work in industry,Q5_2,0,Supervised feature selection,NA
+R_3LYciGosWNIZIsM,I have used tidymodels packages many times,I work in industry,Q5_3,0,Probability calibration (post modeling),NA
+R_3LYciGosWNIZIsM,I have used tidymodels packages many times,I work in industry,Q5_4,0,Probability threshold optimization,NA
+R_3LYciGosWNIZIsM,I have used tidymodels packages many times,I work in industry,Q5_5,0,Spatial analysis models and methods,NA
+R_3LYciGosWNIZIsM,I have used tidymodels packages many times,I work in industry,Q5_6,0,Better serialization tools ,NA
+R_3LYciGosWNIZIsM,I have used tidymodels packages many times,I work in industry,Q5_10,0,H2O.ai support ,NA
+R_3LYciGosWNIZIsM,I have used tidymodels packages many times,I work in industry,Q5_12,100,Other,Precision on Crossvalidation to have both (precision and Recall as stdev) similar like in carrot package
+R_2VIrdJsn6ogn7jk,I have used tidymodels packages many times,I work in industry,Q5_1,0,Model fairness analysis and metrics,NA
+R_2VIrdJsn6ogn7jk,I have used tidymodels packages many times,I work in industry,Q5_2,0,Supervised feature selection,NA
+R_2VIrdJsn6ogn7jk,I have used tidymodels packages many times,I work in industry,Q5_3,0,Probability calibration (post modeling),NA
+R_2VIrdJsn6ogn7jk,I have used tidymodels packages many times,I work in industry,Q5_4,0,Probability threshold optimization,NA
+R_2VIrdJsn6ogn7jk,I have used tidymodels packages many times,I work in industry,Q5_5,0,Spatial analysis models and methods,NA
+R_2VIrdJsn6ogn7jk,I have used tidymodels packages many times,I work in industry,Q5_6,0,Better serialization tools ,NA
+R_2VIrdJsn6ogn7jk,I have used tidymodels packages many times,I work in industry,Q5_10,0,H2O.ai support ,NA
+R_2VIrdJsn6ogn7jk,I have used tidymodels packages many times,I work in industry,Q5_12,100,Other,Precision on cross validation to have both prececision and recall as standard deviation. Similar like in carrot package.
+R_1oAPtrLAPVKnRoO,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_1,25,Model fairness analysis and metrics,NA
+R_1oAPtrLAPVKnRoO,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_2,10,Supervised feature selection,NA
+R_1oAPtrLAPVKnRoO,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_3,10,Probability calibration (post modeling),NA
+R_1oAPtrLAPVKnRoO,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_4,5,Probability threshold optimization,NA
+R_1oAPtrLAPVKnRoO,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_5,10,Spatial analysis models and methods,NA
+R_1oAPtrLAPVKnRoO,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_6,10,Better serialization tools ,NA
+R_1oAPtrLAPVKnRoO,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_10,3,H2O.ai support ,NA
+R_1oAPtrLAPVKnRoO,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_12,27,Other,Graphical investigation
+R_3Dqjju5dMMCTlxA,I have used tidymodels packages many times,I work in industry,Q5_1,20,Model fairness analysis and metrics,NA
+R_3Dqjju5dMMCTlxA,I have used tidymodels packages many times,I work in industry,Q5_2,80,Supervised feature selection,NA
+R_3Dqjju5dMMCTlxA,I have used tidymodels packages many times,I work in industry,Q5_3,0,Probability calibration (post modeling),NA
+R_3Dqjju5dMMCTlxA,I have used tidymodels packages many times,I work in industry,Q5_4,0,Probability threshold optimization,NA
+R_3Dqjju5dMMCTlxA,I have used tidymodels packages many times,I work in industry,Q5_5,0,Spatial analysis models and methods,NA
+R_3Dqjju5dMMCTlxA,I have used tidymodels packages many times,I work in industry,Q5_6,0,Better serialization tools ,NA
+R_3Dqjju5dMMCTlxA,I have used tidymodels packages many times,I work in industry,Q5_10,0,H2O.ai support ,NA
+R_3Dqjju5dMMCTlxA,I have used tidymodels packages many times,I work in industry,Q5_12,0,Other,NA
+R_2uOqREdswqIkifD,I have used tidymodels packages many times,I work in industry,Q5_1,30,Model fairness analysis and metrics,NA
+R_2uOqREdswqIkifD,I have used tidymodels packages many times,I work in industry,Q5_2,50,Supervised feature selection,NA
+R_2uOqREdswqIkifD,I have used tidymodels packages many times,I work in industry,Q5_3,0,Probability calibration (post modeling),NA
+R_2uOqREdswqIkifD,I have used tidymodels packages many times,I work in industry,Q5_4,20,Probability threshold optimization,NA
+R_2uOqREdswqIkifD,I have used tidymodels packages many times,I work in industry,Q5_5,0,Spatial analysis models and methods,NA
+R_2uOqREdswqIkifD,I have used tidymodels packages many times,I work in industry,Q5_6,0,Better serialization tools ,NA
+R_2uOqREdswqIkifD,I have used tidymodels packages many times,I work in industry,Q5_10,0,H2O.ai support ,NA
+R_2uOqREdswqIkifD,I have used tidymodels packages many times,I work in industry,Q5_12,0,Other,NA
+R_31vkIXoSKuG6pl5,I have used tidymodels packages many times,I work in industry,Q5_1,0,Model fairness analysis and metrics,NA
+R_31vkIXoSKuG6pl5,I have used tidymodels packages many times,I work in industry,Q5_2,0,Supervised feature selection,NA
+R_31vkIXoSKuG6pl5,I have used tidymodels packages many times,I work in industry,Q5_3,15,Probability calibration (post modeling),NA
+R_31vkIXoSKuG6pl5,I have used tidymodels packages many times,I work in industry,Q5_4,15,Probability threshold optimization,NA
+R_31vkIXoSKuG6pl5,I have used tidymodels packages many times,I work in industry,Q5_5,0,Spatial analysis models and methods,NA
+R_31vkIXoSKuG6pl5,I have used tidymodels packages many times,I work in industry,Q5_6,0,Better serialization tools ,NA
+R_31vkIXoSKuG6pl5,I have used tidymodels packages many times,I work in industry,Q5_10,0,H2O.ai support ,NA
+R_31vkIXoSKuG6pl5,I have used tidymodels packages many times,I work in industry,Q5_12,70,Other,precision on cross validation to have both precision and recall. SD of those is my basic validation metric for production
+R_3MbrFAm6EgZXUFi,I have used tidymodels packages many times,I work in industry,Q5_1,0,Model fairness analysis and metrics,NA
+R_3MbrFAm6EgZXUFi,I have used tidymodels packages many times,I work in industry,Q5_2,50,Supervised feature selection,NA
+R_3MbrFAm6EgZXUFi,I have used tidymodels packages many times,I work in industry,Q5_3,0,Probability calibration (post modeling),NA
+R_3MbrFAm6EgZXUFi,I have used tidymodels packages many times,I work in industry,Q5_4,0,Probability threshold optimization,NA
+R_3MbrFAm6EgZXUFi,I have used tidymodels packages many times,I work in industry,Q5_5,0,Spatial analysis models and methods,NA
+R_3MbrFAm6EgZXUFi,I have used tidymodels packages many times,I work in industry,Q5_6,50,Better serialization tools ,NA
+R_3MbrFAm6EgZXUFi,I have used tidymodels packages many times,I work in industry,Q5_10,0,H2O.ai support ,NA
+R_3MbrFAm6EgZXUFi,I have used tidymodels packages many times,I work in industry,Q5_12,0,Other,NA
+R_23V0fqr64cGOA1M,I have used tidymodels packages a few times,I work in industry,Q5_1,0,Model fairness analysis and metrics,NA
+R_23V0fqr64cGOA1M,I have used tidymodels packages a few times,I work in industry,Q5_2,20,Supervised feature selection,NA
+R_23V0fqr64cGOA1M,I have used tidymodels packages a few times,I work in industry,Q5_3,0,Probability calibration (post modeling),NA
+R_23V0fqr64cGOA1M,I have used tidymodels packages a few times,I work in industry,Q5_4,10,Probability threshold optimization,NA
+R_23V0fqr64cGOA1M,I have used tidymodels packages a few times,I work in industry,Q5_5,0,Spatial analysis models and methods,NA
+R_23V0fqr64cGOA1M,I have used tidymodels packages a few times,I work in industry,Q5_6,0,Better serialization tools ,NA
+R_23V0fqr64cGOA1M,I have used tidymodels packages a few times,I work in industry,Q5_10,35,H2O.ai support ,NA
+R_23V0fqr64cGOA1M,I have used tidymodels packages a few times,I work in industry,Q5_12,35,Other,Survival Methods
+R_yPU0ZPu1jW0OiA1,I have used tidymodels packages many times,I work in industry,Q5_1,30,Model fairness analysis and metrics,NA
+R_yPU0ZPu1jW0OiA1,I have used tidymodels packages many times,I work in industry,Q5_2,10,Supervised feature selection,NA
+R_yPU0ZPu1jW0OiA1,I have used tidymodels packages many times,I work in industry,Q5_3,10,Probability calibration (post modeling),NA
+R_yPU0ZPu1jW0OiA1,I have used tidymodels packages many times,I work in industry,Q5_4,10,Probability threshold optimization,NA
+R_yPU0ZPu1jW0OiA1,I have used tidymodels packages many times,I work in industry,Q5_5,0,Spatial analysis models and methods,NA
+R_yPU0ZPu1jW0OiA1,I have used tidymodels packages many times,I work in industry,Q5_6,10,Better serialization tools ,NA
+R_yPU0ZPu1jW0OiA1,I have used tidymodels packages many times,I work in industry,Q5_10,30,H2O.ai support ,NA
+R_yPU0ZPu1jW0OiA1,I have used tidymodels packages many times,I work in industry,Q5_12,0,Other,NA
+R_3EDOdLQGMLBVILe,I have used tidymodels packages many times,I work in industry,Q5_1,0,Model fairness analysis and metrics,NA
+R_3EDOdLQGMLBVILe,I have used tidymodels packages many times,I work in industry,Q5_2,60,Supervised feature selection,NA
+R_3EDOdLQGMLBVILe,I have used tidymodels packages many times,I work in industry,Q5_3,8,Probability calibration (post modeling),NA
+R_3EDOdLQGMLBVILe,I have used tidymodels packages many times,I work in industry,Q5_4,8,Probability threshold optimization,NA
+R_3EDOdLQGMLBVILe,I have used tidymodels packages many times,I work in industry,Q5_5,8,Spatial analysis models and methods,NA
+R_3EDOdLQGMLBVILe,I have used tidymodels packages many times,I work in industry,Q5_6,16,Better serialization tools ,NA
+R_3EDOdLQGMLBVILe,I have used tidymodels packages many times,I work in industry,Q5_10,0,H2O.ai support ,NA
+R_3EDOdLQGMLBVILe,I have used tidymodels packages many times,I work in industry,Q5_12,0,Other,NA
+R_3EtWh0ZiUGeLkAj,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_1,0,Model fairness analysis and metrics,NA
+R_3EtWh0ZiUGeLkAj,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_2,30,Supervised feature selection,NA
+R_3EtWh0ZiUGeLkAj,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_3,0,Probability calibration (post modeling),NA
+R_3EtWh0ZiUGeLkAj,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_4,20,Probability threshold optimization,NA
+R_3EtWh0ZiUGeLkAj,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_5,0,Spatial analysis models and methods,NA
+R_3EtWh0ZiUGeLkAj,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_6,0,Better serialization tools ,NA
+R_3EtWh0ZiUGeLkAj,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_10,0,H2O.ai support ,NA
+R_3EtWh0ZiUGeLkAj,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_12,50,Other,Survival analysis
+R_2D0IOFzGyGj3FBf,I have used tidymodels packages a few times,I work in industry,Q5_1,10,Model fairness analysis and metrics,NA
+R_2D0IOFzGyGj3FBf,I have used tidymodels packages a few times,I work in industry,Q5_2,20,Supervised feature selection,NA
+R_2D0IOFzGyGj3FBf,I have used tidymodels packages a few times,I work in industry,Q5_3,20,Probability calibration (post modeling),NA
+R_2D0IOFzGyGj3FBf,I have used tidymodels packages a few times,I work in industry,Q5_4,20,Probability threshold optimization,NA
+R_2D0IOFzGyGj3FBf,I have used tidymodels packages a few times,I work in industry,Q5_5,10,Spatial analysis models and methods,NA
+R_2D0IOFzGyGj3FBf,I have used tidymodels packages a few times,I work in industry,Q5_6,10,Better serialization tools ,NA
+R_2D0IOFzGyGj3FBf,I have used tidymodels packages a few times,I work in industry,Q5_10,10,H2O.ai support ,NA
+R_2D0IOFzGyGj3FBf,I have used tidymodels packages a few times,I work in industry,Q5_12,0,Other,NA
+R_3dX1l4lvPWzOczX,I have used tidymodels packages a few times,I work in industry,Q5_1,20,Model fairness analysis and metrics,NA
+R_3dX1l4lvPWzOczX,I have used tidymodels packages a few times,I work in industry,Q5_2,10,Supervised feature selection,NA
+R_3dX1l4lvPWzOczX,I have used tidymodels packages a few times,I work in industry,Q5_3,10,Probability calibration (post modeling),NA
+R_3dX1l4lvPWzOczX,I have used tidymodels packages a few times,I work in industry,Q5_4,0,Probability threshold optimization,NA
+R_3dX1l4lvPWzOczX,I have used tidymodels packages a few times,I work in industry,Q5_5,20,Spatial analysis models and methods,NA
+R_3dX1l4lvPWzOczX,I have used tidymodels packages a few times,I work in industry,Q5_6,40,Better serialization tools ,NA
+R_3dX1l4lvPWzOczX,I have used tidymodels packages a few times,I work in industry,Q5_10,0,H2O.ai support ,NA
+R_3dX1l4lvPWzOczX,I have used tidymodels packages a few times,I work in industry,Q5_12,0,Other,NA
+R_3nobj2diKdtRkUy,I have used tidymodels packages a few times,I work in industry,Q5_1,10,Model fairness analysis and metrics,NA
+R_3nobj2diKdtRkUy,I have used tidymodels packages a few times,I work in industry,Q5_2,5,Supervised feature selection,NA
+R_3nobj2diKdtRkUy,I have used tidymodels packages a few times,I work in industry,Q5_3,0,Probability calibration (post modeling),NA
+R_3nobj2diKdtRkUy,I have used tidymodels packages a few times,I work in industry,Q5_4,0,Probability threshold optimization,NA
+R_3nobj2diKdtRkUy,I have used tidymodels packages a few times,I work in industry,Q5_5,50,Spatial analysis models and methods,NA
+R_3nobj2diKdtRkUy,I have used tidymodels packages a few times,I work in industry,Q5_6,10,Better serialization tools ,NA
+R_3nobj2diKdtRkUy,I have used tidymodels packages a few times,I work in industry,Q5_10,25,H2O.ai support ,NA
+R_3nobj2diKdtRkUy,I have used tidymodels packages a few times,I work in industry,Q5_12,0,Other,NA
+R_DvCyo9zA1FKu3m1,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_1,30,Model fairness analysis and metrics,NA
+R_DvCyo9zA1FKu3m1,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_2,30,Supervised feature selection,NA
+R_DvCyo9zA1FKu3m1,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_3,0,Probability calibration (post modeling),NA
+R_DvCyo9zA1FKu3m1,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_4,40,Probability threshold optimization,NA
+R_DvCyo9zA1FKu3m1,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_5,0,Spatial analysis models and methods,NA
+R_DvCyo9zA1FKu3m1,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_6,0,Better serialization tools ,NA
+R_DvCyo9zA1FKu3m1,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_10,0,H2O.ai support ,NA
+R_DvCyo9zA1FKu3m1,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_12,0,Other,NA
+R_2Ym1Bl5POzi0lXU,I have used tidymodels packages a few times,I work in industry,Q5_1,10,Model fairness analysis and metrics,NA
+R_2Ym1Bl5POzi0lXU,I have used tidymodels packages a few times,I work in industry,Q5_2,0,Supervised feature selection,NA
+R_2Ym1Bl5POzi0lXU,I have used tidymodels packages a few times,I work in industry,Q5_3,40,Probability calibration (post modeling),NA
+R_2Ym1Bl5POzi0lXU,I have used tidymodels packages a few times,I work in industry,Q5_4,0,Probability threshold optimization,NA
+R_2Ym1Bl5POzi0lXU,I have used tidymodels packages a few times,I work in industry,Q5_5,40,Spatial analysis models and methods,NA
+R_2Ym1Bl5POzi0lXU,I have used tidymodels packages a few times,I work in industry,Q5_6,10,Better serialization tools ,NA
+R_2Ym1Bl5POzi0lXU,I have used tidymodels packages a few times,I work in industry,Q5_10,0,H2O.ai support ,NA
+R_2Ym1Bl5POzi0lXU,I have used tidymodels packages a few times,I work in industry,Q5_12,0,Other,NA
+R_3DtNKX4X1yApxFr,I have used tidymodels packages many times,I work in industry,Q5_1,20,Model fairness analysis and metrics,NA
+R_3DtNKX4X1yApxFr,I have used tidymodels packages many times,I work in industry,Q5_2,15,Supervised feature selection,NA
+R_3DtNKX4X1yApxFr,I have used tidymodels packages many times,I work in industry,Q5_3,10,Probability calibration (post modeling),NA
+R_3DtNKX4X1yApxFr,I have used tidymodels packages many times,I work in industry,Q5_4,15,Probability threshold optimization,NA
+R_3DtNKX4X1yApxFr,I have used tidymodels packages many times,I work in industry,Q5_5,0,Spatial analysis models and methods,NA
+R_3DtNKX4X1yApxFr,I have used tidymodels packages many times,I work in industry,Q5_6,10,Better serialization tools ,NA
+R_3DtNKX4X1yApxFr,I have used tidymodels packages many times,I work in industry,Q5_10,15,H2O.ai support ,NA
+R_3DtNKX4X1yApxFr,I have used tidymodels packages many times,I work in industry,Q5_12,15,Other,Explainable AI
+R_1dohObB8JEay3l7,I have used tidymodels packages a few times,I work in industry,Q5_1,0,Model fairness analysis and metrics,NA
+R_1dohObB8JEay3l7,I have used tidymodels packages a few times,I work in industry,Q5_2,0,Supervised feature selection,NA
+R_1dohObB8JEay3l7,I have used tidymodels packages a few times,I work in industry,Q5_3,0,Probability calibration (post modeling),NA
+R_1dohObB8JEay3l7,I have used tidymodels packages a few times,I work in industry,Q5_4,0,Probability threshold optimization,NA
+R_1dohObB8JEay3l7,I have used tidymodels packages a few times,I work in industry,Q5_5,0,Spatial analysis models and methods,NA
+R_1dohObB8JEay3l7,I have used tidymodels packages a few times,I work in industry,Q5_6,0,Better serialization tools ,NA
+R_1dohObB8JEay3l7,I have used tidymodels packages a few times,I work in industry,Q5_10,0,H2O.ai support ,NA
+R_1dohObB8JEay3l7,I have used tidymodels packages a few times,I work in industry,Q5_12,100,Other,Weights
+R_1OUeYzzPenNqBel,I have used tidymodels packages a few times,I work in industry,Q5_1,0,Model fairness analysis and metrics,NA
+R_1OUeYzzPenNqBel,I have used tidymodels packages a few times,I work in industry,Q5_2,10,Supervised feature selection,NA
+R_1OUeYzzPenNqBel,I have used tidymodels packages a few times,I work in industry,Q5_3,0,Probability calibration (post modeling),NA
+R_1OUeYzzPenNqBel,I have used tidymodels packages a few times,I work in industry,Q5_4,10,Probability threshold optimization,NA
+R_1OUeYzzPenNqBel,I have used tidymodels packages a few times,I work in industry,Q5_5,0,Spatial analysis models and methods,NA
+R_1OUeYzzPenNqBel,I have used tidymodels packages a few times,I work in industry,Q5_6,0,Better serialization tools ,NA
+R_1OUeYzzPenNqBel,I have used tidymodels packages a few times,I work in industry,Q5_10,0,H2O.ai support ,NA
+R_1OUeYzzPenNqBel,I have used tidymodels packages a few times,I work in industry,Q5_12,80,Other,"Fewer functions, more options/arguments within functions"
+R_3ENhl84Z3r59umI,I have used tidymodels packages a few times,I am a hobbyist,Q5_1,15,Model fairness analysis and metrics,NA
+R_3ENhl84Z3r59umI,I have used tidymodels packages a few times,I am a hobbyist,Q5_2,20,Supervised feature selection,NA
+R_3ENhl84Z3r59umI,I have used tidymodels packages a few times,I am a hobbyist,Q5_3,25,Probability calibration (post modeling),NA
+R_3ENhl84Z3r59umI,I have used tidymodels packages a few times,I am a hobbyist,Q5_4,0,Probability threshold optimization,NA
+R_3ENhl84Z3r59umI,I have used tidymodels packages a few times,I am a hobbyist,Q5_5,10,Spatial analysis models and methods,NA
+R_3ENhl84Z3r59umI,I have used tidymodels packages a few times,I am a hobbyist,Q5_6,20,Better serialization tools ,NA
+R_3ENhl84Z3r59umI,I have used tidymodels packages a few times,I am a hobbyist,Q5_10,5,H2O.ai support ,NA
+R_3ENhl84Z3r59umI,I have used tidymodels packages a few times,I am a hobbyist,Q5_12,5,Other,improving stability
+R_2e8RMoID1Y9VTCa,I have used tidymodels packages many times,I work in industry,Q5_1,0,Model fairness analysis and metrics,NA
+R_2e8RMoID1Y9VTCa,I have used tidymodels packages many times,I work in industry,Q5_2,15,Supervised feature selection,NA
+R_2e8RMoID1Y9VTCa,I have used tidymodels packages many times,I work in industry,Q5_3,0,Probability calibration (post modeling),NA
+R_2e8RMoID1Y9VTCa,I have used tidymodels packages many times,I work in industry,Q5_4,0,Probability threshold optimization,NA
+R_2e8RMoID1Y9VTCa,I have used tidymodels packages many times,I work in industry,Q5_5,20,Spatial analysis models and methods,NA
+R_2e8RMoID1Y9VTCa,I have used tidymodels packages many times,I work in industry,Q5_6,15,Better serialization tools ,NA
+R_2e8RMoID1Y9VTCa,I have used tidymodels packages many times,I work in industry,Q5_10,50,H2O.ai support ,NA
+R_2e8RMoID1Y9VTCa,I have used tidymodels packages many times,I work in industry,Q5_12,0,Other,NA
+R_3L5s7lybfwsM5C0,I have used tidymodels packages a few times,I work in industry,Q5_1,0,Model fairness analysis and metrics,NA
+R_3L5s7lybfwsM5C0,I have used tidymodels packages a few times,I work in industry,Q5_2,30,Supervised feature selection,NA
+R_3L5s7lybfwsM5C0,I have used tidymodels packages a few times,I work in industry,Q5_3,0,Probability calibration (post modeling),NA
+R_3L5s7lybfwsM5C0,I have used tidymodels packages a few times,I work in industry,Q5_4,10,Probability threshold optimization,NA
+R_3L5s7lybfwsM5C0,I have used tidymodels packages a few times,I work in industry,Q5_5,0,Spatial analysis models and methods,NA
+R_3L5s7lybfwsM5C0,I have used tidymodels packages a few times,I work in industry,Q5_6,30,Better serialization tools ,NA
+R_3L5s7lybfwsM5C0,I have used tidymodels packages a few times,I work in industry,Q5_10,30,H2O.ai support ,NA
+R_3L5s7lybfwsM5C0,I have used tidymodels packages a few times,I work in industry,Q5_12,0,Other,NA
+R_3oNGZwrW5dtnnZU,I have used tidymodels packages a few times,I work in industry,Q5_1,20,Model fairness analysis and metrics,NA
+R_3oNGZwrW5dtnnZU,I have used tidymodels packages a few times,I work in industry,Q5_2,15,Supervised feature selection,NA
+R_3oNGZwrW5dtnnZU,I have used tidymodels packages a few times,I work in industry,Q5_3,15,Probability calibration (post modeling),NA
+R_3oNGZwrW5dtnnZU,I have used tidymodels packages a few times,I work in industry,Q5_4,20,Probability threshold optimization,NA
+R_3oNGZwrW5dtnnZU,I have used tidymodels packages a few times,I work in industry,Q5_5,15,Spatial analysis models and methods,NA
+R_3oNGZwrW5dtnnZU,I have used tidymodels packages a few times,I work in industry,Q5_6,15,Better serialization tools ,NA
+R_3oNGZwrW5dtnnZU,I have used tidymodels packages a few times,I work in industry,Q5_10,0,H2O.ai support ,NA
+R_3oNGZwrW5dtnnZU,I have used tidymodels packages a few times,I work in industry,Q5_12,0,Other,NA
+R_2R95qmROw5tjqc1,I have used tidymodels packages a few times,I work in industry,Q5_1,0,Model fairness analysis and metrics,NA
+R_2R95qmROw5tjqc1,I have used tidymodels packages a few times,I work in industry,Q5_2,30,Supervised feature selection,NA
+R_2R95qmROw5tjqc1,I have used tidymodels packages a few times,I work in industry,Q5_3,20,Probability calibration (post modeling),NA
+R_2R95qmROw5tjqc1,I have used tidymodels packages a few times,I work in industry,Q5_4,30,Probability threshold optimization,NA
+R_2R95qmROw5tjqc1,I have used tidymodels packages a few times,I work in industry,Q5_5,0,Spatial analysis models and methods,NA
+R_2R95qmROw5tjqc1,I have used tidymodels packages a few times,I work in industry,Q5_6,0,Better serialization tools ,NA
+R_2R95qmROw5tjqc1,I have used tidymodels packages a few times,I work in industry,Q5_10,20,H2O.ai support ,NA
+R_2R95qmROw5tjqc1,I have used tidymodels packages a few times,I work in industry,Q5_12,0,Other,NA
+R_wUcUlq1jJonOoqB,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_1,5,Model fairness analysis and metrics,NA
+R_wUcUlq1jJonOoqB,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_2,20,Supervised feature selection,NA
+R_wUcUlq1jJonOoqB,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_3,5,Probability calibration (post modeling),NA
+R_wUcUlq1jJonOoqB,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_4,5,Probability threshold optimization,NA
+R_wUcUlq1jJonOoqB,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_5,55,Spatial analysis models and methods,NA
+R_wUcUlq1jJonOoqB,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_6,5,Better serialization tools ,NA
+R_wUcUlq1jJonOoqB,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_10,5,H2O.ai support ,NA
+R_wUcUlq1jJonOoqB,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_12,0,Other,NA
+R_cO38PFPijlFhecF,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_1,20,Model fairness analysis and metrics,NA
+R_cO38PFPijlFhecF,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_2,25,Supervised feature selection,NA
+R_cO38PFPijlFhecF,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_3,0,Probability calibration (post modeling),NA
+R_cO38PFPijlFhecF,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_4,0,Probability threshold optimization,NA
+R_cO38PFPijlFhecF,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_5,20,Spatial analysis models and methods,NA
+R_cO38PFPijlFhecF,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_6,15,Better serialization tools ,NA
+R_cO38PFPijlFhecF,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_10,20,H2O.ai support ,NA
+R_cO38PFPijlFhecF,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_12,0,Other,NA
+R_1M6ubTdUvz0Jz9u,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_1,30,Model fairness analysis and metrics,NA
+R_1M6ubTdUvz0Jz9u,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_2,30,Supervised feature selection,NA
+R_1M6ubTdUvz0Jz9u,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_3,0,Probability calibration (post modeling),NA
+R_1M6ubTdUvz0Jz9u,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_4,0,Probability threshold optimization,NA
+R_1M6ubTdUvz0Jz9u,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_5,0,Spatial analysis models and methods,NA
+R_1M6ubTdUvz0Jz9u,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_6,0,Better serialization tools ,NA
+R_1M6ubTdUvz0Jz9u,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_10,0,H2O.ai support ,NA
+R_1M6ubTdUvz0Jz9u,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_12,40,Other,links to datavis
+R_R2KIxvnxb10BMIh,I have used tidymodels packages a few times,I work in industry,Q5_1,0,Model fairness analysis and metrics,NA
+R_R2KIxvnxb10BMIh,I have used tidymodels packages a few times,I work in industry,Q5_2,50,Supervised feature selection,NA
+R_R2KIxvnxb10BMIh,I have used tidymodels packages a few times,I work in industry,Q5_3,0,Probability calibration (post modeling),NA
+R_R2KIxvnxb10BMIh,I have used tidymodels packages a few times,I work in industry,Q5_4,50,Probability threshold optimization,NA
+R_R2KIxvnxb10BMIh,I have used tidymodels packages a few times,I work in industry,Q5_5,0,Spatial analysis models and methods,NA
+R_R2KIxvnxb10BMIh,I have used tidymodels packages a few times,I work in industry,Q5_6,0,Better serialization tools ,NA
+R_R2KIxvnxb10BMIh,I have used tidymodels packages a few times,I work in industry,Q5_10,0,H2O.ai support ,NA
+R_R2KIxvnxb10BMIh,I have used tidymodels packages a few times,I work in industry,Q5_12,0,Other,NA
+R_2sUdJ8mfXNiFtvI,I have used tidymodels packages many times,I work in industry,Q5_1,0,Model fairness analysis and metrics,NA
+R_2sUdJ8mfXNiFtvI,I have used tidymodels packages many times,I work in industry,Q5_2,15,Supervised feature selection,NA
+R_2sUdJ8mfXNiFtvI,I have used tidymodels packages many times,I work in industry,Q5_3,30,Probability calibration (post modeling),NA
+R_2sUdJ8mfXNiFtvI,I have used tidymodels packages many times,I work in industry,Q5_4,30,Probability threshold optimization,NA
+R_2sUdJ8mfXNiFtvI,I have used tidymodels packages many times,I work in industry,Q5_5,0,Spatial analysis models and methods,NA
+R_2sUdJ8mfXNiFtvI,I have used tidymodels packages many times,I work in industry,Q5_6,20,Better serialization tools ,NA
+R_2sUdJ8mfXNiFtvI,I have used tidymodels packages many times,I work in industry,Q5_10,5,H2O.ai support ,NA
+R_2sUdJ8mfXNiFtvI,I have used tidymodels packages many times,I work in industry,Q5_12,0,Other,NA
+R_R83s0euPX01iBO1,I have used tidymodels packages a few times,I work in industry,Q5_1,0,Model fairness analysis and metrics,NA
+R_R83s0euPX01iBO1,I have used tidymodels packages a few times,I work in industry,Q5_2,0,Supervised feature selection,NA
+R_R83s0euPX01iBO1,I have used tidymodels packages a few times,I work in industry,Q5_3,0,Probability calibration (post modeling),NA
+R_R83s0euPX01iBO1,I have used tidymodels packages a few times,I work in industry,Q5_4,0,Probability threshold optimization,NA
+R_R83s0euPX01iBO1,I have used tidymodels packages a few times,I work in industry,Q5_5,0,Spatial analysis models and methods,NA
+R_R83s0euPX01iBO1,I have used tidymodels packages a few times,I work in industry,Q5_6,0,Better serialization tools ,NA
+R_R83s0euPX01iBO1,I have used tidymodels packages a few times,I work in industry,Q5_10,0,H2O.ai support ,NA
+R_R83s0euPX01iBO1,I have used tidymodels packages a few times,I work in industry,Q5_12,100,Other,"Syntax update, similar to how reshape2 went to dplyr works. This is the one area python has R beat still given scikit learn is actually easy to pick up"
+R_1GQ9hTEJj7D5JBa,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_1,20,Model fairness analysis and metrics,NA
+R_1GQ9hTEJj7D5JBa,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_2,20,Supervised feature selection,NA
+R_1GQ9hTEJj7D5JBa,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_3,0,Probability calibration (post modeling),NA
+R_1GQ9hTEJj7D5JBa,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_4,50,Probability threshold optimization,NA
+R_1GQ9hTEJj7D5JBa,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_5,0,Spatial analysis models and methods,NA
+R_1GQ9hTEJj7D5JBa,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_6,0,Better serialization tools ,NA
+R_1GQ9hTEJj7D5JBa,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_10,10,H2O.ai support ,NA
+R_1GQ9hTEJj7D5JBa,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_12,0,Other,NA
+R_3KZ9KBgELtzEoXC,I have used tidymodels packages a few times,I work in industry,Q5_1,10,Model fairness analysis and metrics,NA
+R_3KZ9KBgELtzEoXC,I have used tidymodels packages a few times,I work in industry,Q5_2,40,Supervised feature selection,NA
+R_3KZ9KBgELtzEoXC,I have used tidymodels packages a few times,I work in industry,Q5_3,20,Probability calibration (post modeling),NA
+R_3KZ9KBgELtzEoXC,I have used tidymodels packages a few times,I work in industry,Q5_4,20,Probability threshold optimization,NA
+R_3KZ9KBgELtzEoXC,I have used tidymodels packages a few times,I work in industry,Q5_5,0,Spatial analysis models and methods,NA
+R_3KZ9KBgELtzEoXC,I have used tidymodels packages a few times,I work in industry,Q5_6,10,Better serialization tools ,NA
+R_3KZ9KBgELtzEoXC,I have used tidymodels packages a few times,I work in industry,Q5_10,0,H2O.ai support ,NA
+R_3KZ9KBgELtzEoXC,I have used tidymodels packages a few times,I work in industry,Q5_12,0,Other,NA
+R_240J07KlqKJUDOi,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_1,0,Model fairness analysis and metrics,NA
+R_240J07KlqKJUDOi,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_2,0,Supervised feature selection,NA
+R_240J07KlqKJUDOi,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_3,0,Probability calibration (post modeling),NA
+R_240J07KlqKJUDOi,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_4,0,Probability threshold optimization,NA
+R_240J07KlqKJUDOi,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_5,0,Spatial analysis models and methods,NA
+R_240J07KlqKJUDOi,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_6,0,Better serialization tools ,NA
+R_240J07KlqKJUDOi,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_10,0,H2O.ai support ,NA
+R_240J07KlqKJUDOi,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_12,100,Other,additional support for sparse matrices
+R_1N504NcBf75gpqO,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_1,0,Model fairness analysis and metrics,NA
+R_1N504NcBf75gpqO,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_2,50,Supervised feature selection,NA
+R_1N504NcBf75gpqO,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_3,0,Probability calibration (post modeling),NA
+R_1N504NcBf75gpqO,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_4,0,Probability threshold optimization,NA
+R_1N504NcBf75gpqO,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_5,50,Spatial analysis models and methods,NA
+R_1N504NcBf75gpqO,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_6,0,Better serialization tools ,NA
+R_1N504NcBf75gpqO,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_10,0,H2O.ai support ,NA
+R_1N504NcBf75gpqO,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_12,0,Other,NA
+R_1o7Kyme0Tad99Bx,I have used tidymodels packages a few times,I am a student,Q5_1,10,Model fairness analysis and metrics,NA
+R_1o7Kyme0Tad99Bx,I have used tidymodels packages a few times,I am a student,Q5_2,10,Supervised feature selection,NA
+R_1o7Kyme0Tad99Bx,I have used tidymodels packages a few times,I am a student,Q5_3,5,Probability calibration (post modeling),NA
+R_1o7Kyme0Tad99Bx,I have used tidymodels packages a few times,I am a student,Q5_4,0,Probability threshold optimization,NA
+R_1o7Kyme0Tad99Bx,I have used tidymodels packages a few times,I am a student,Q5_5,30,Spatial analysis models and methods,NA
+R_1o7Kyme0Tad99Bx,I have used tidymodels packages a few times,I am a student,Q5_6,15,Better serialization tools ,NA
+R_1o7Kyme0Tad99Bx,I have used tidymodels packages a few times,I am a student,Q5_10,5,H2O.ai support ,NA
+R_1o7Kyme0Tad99Bx,I have used tidymodels packages a few times,I am a student,Q5_12,25,Other,Expanded support for models
+R_22lbkLc299h3UkN,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_1,12.5,Model fairness analysis and metrics,NA
+R_22lbkLc299h3UkN,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_2,25,Supervised feature selection,NA
+R_22lbkLc299h3UkN,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_3,12.5,Probability calibration (post modeling),NA
+R_22lbkLc299h3UkN,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_4,12.5,Probability threshold optimization,NA
+R_22lbkLc299h3UkN,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_5,12.5,Spatial analysis models and methods,NA
+R_22lbkLc299h3UkN,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_6,12.5,Better serialization tools ,NA
+R_22lbkLc299h3UkN,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_10,0,H2O.ai support ,NA
+R_22lbkLc299h3UkN,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_12,12.5,Other,"speed, GAMs"
+R_30crQiNBtvSrHgT,I have used tidymodels packages a few times,I work in industry,Q5_1,0,Model fairness analysis and metrics,NA
+R_30crQiNBtvSrHgT,I have used tidymodels packages a few times,I work in industry,Q5_2,0,Supervised feature selection,NA
+R_30crQiNBtvSrHgT,I have used tidymodels packages a few times,I work in industry,Q5_3,50,Probability calibration (post modeling),NA
+R_30crQiNBtvSrHgT,I have used tidymodels packages a few times,I work in industry,Q5_4,0,Probability threshold optimization,NA
+R_30crQiNBtvSrHgT,I have used tidymodels packages a few times,I work in industry,Q5_5,0,Spatial analysis models and methods,NA
+R_30crQiNBtvSrHgT,I have used tidymodels packages a few times,I work in industry,Q5_6,50,Better serialization tools ,NA
+R_30crQiNBtvSrHgT,I have used tidymodels packages a few times,I work in industry,Q5_10,0,H2O.ai support ,NA
+R_30crQiNBtvSrHgT,I have used tidymodels packages a few times,I work in industry,Q5_12,0,Other,NA
+R_2BbV2F8cKEoDK71,I have used tidymodels packages a few times,I work in industry,Q5_1,50,Model fairness analysis and metrics,NA
+R_2BbV2F8cKEoDK71,I have used tidymodels packages a few times,I work in industry,Q5_2,0,Supervised feature selection,NA
+R_2BbV2F8cKEoDK71,I have used tidymodels packages a few times,I work in industry,Q5_3,0,Probability calibration (post modeling),NA
+R_2BbV2F8cKEoDK71,I have used tidymodels packages a few times,I work in industry,Q5_4,0,Probability threshold optimization,NA
+R_2BbV2F8cKEoDK71,I have used tidymodels packages a few times,I work in industry,Q5_5,0,Spatial analysis models and methods,NA
+R_2BbV2F8cKEoDK71,I have used tidymodels packages a few times,I work in industry,Q5_6,50,Better serialization tools ,NA
+R_2BbV2F8cKEoDK71,I have used tidymodels packages a few times,I work in industry,Q5_10,0,H2O.ai support ,NA
+R_2BbV2F8cKEoDK71,I have used tidymodels packages a few times,I work in industry,Q5_12,0,Other,NA
+R_2s5z1bKVHHvsk6s,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_1,0,Model fairness analysis and metrics,NA
+R_2s5z1bKVHHvsk6s,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_2,70,Supervised feature selection,NA
+R_2s5z1bKVHHvsk6s,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_3,0,Probability calibration (post modeling),NA
+R_2s5z1bKVHHvsk6s,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_4,15,Probability threshold optimization,NA
+R_2s5z1bKVHHvsk6s,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_5,15,Spatial analysis models and methods,NA
+R_2s5z1bKVHHvsk6s,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_6,0,Better serialization tools ,NA
+R_2s5z1bKVHHvsk6s,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_10,0,H2O.ai support ,NA
+R_2s5z1bKVHHvsk6s,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_12,0,Other,NA
+R_2wStKp2Df1435Y5,I have used tidymodels packages many times,I work in industry,Q5_1,10,Model fairness analysis and metrics,NA
+R_2wStKp2Df1435Y5,I have used tidymodels packages many times,I work in industry,Q5_2,10,Supervised feature selection,NA
+R_2wStKp2Df1435Y5,I have used tidymodels packages many times,I work in industry,Q5_3,20,Probability calibration (post modeling),NA
+R_2wStKp2Df1435Y5,I have used tidymodels packages many times,I work in industry,Q5_4,20,Probability threshold optimization,NA
+R_2wStKp2Df1435Y5,I have used tidymodels packages many times,I work in industry,Q5_5,10,Spatial analysis models and methods,NA
+R_2wStKp2Df1435Y5,I have used tidymodels packages many times,I work in industry,Q5_6,20,Better serialization tools ,NA
+R_2wStKp2Df1435Y5,I have used tidymodels packages many times,I work in industry,Q5_10,10,H2O.ai support ,NA
+R_2wStKp2Df1435Y5,I have used tidymodels packages many times,I work in industry,Q5_12,0,Other,NA
+R_2Yy7S6n8Dmp1mwU,I have used tidymodels packages a few times,I work in industry,Q5_1,0,Model fairness analysis and metrics,NA
+R_2Yy7S6n8Dmp1mwU,I have used tidymodels packages a few times,I work in industry,Q5_2,20,Supervised feature selection,NA
+R_2Yy7S6n8Dmp1mwU,I have used tidymodels packages a few times,I work in industry,Q5_3,20,Probability calibration (post modeling),NA
+R_2Yy7S6n8Dmp1mwU,I have used tidymodels packages a few times,I work in industry,Q5_4,20,Probability threshold optimization,NA
+R_2Yy7S6n8Dmp1mwU,I have used tidymodels packages a few times,I work in industry,Q5_5,0,Spatial analysis models and methods,NA
+R_2Yy7S6n8Dmp1mwU,I have used tidymodels packages a few times,I work in industry,Q5_6,0,Better serialization tools ,NA
+R_2Yy7S6n8Dmp1mwU,I have used tidymodels packages a few times,I work in industry,Q5_10,40,H2O.ai support ,NA
+R_2Yy7S6n8Dmp1mwU,I have used tidymodels packages a few times,I work in industry,Q5_12,0,Other,NA
+R_2YQcmuwDQM0L9hq,I have used tidymodels packages many times,I work in industry,Q5_1,1,Model fairness analysis and metrics,NA
+R_2YQcmuwDQM0L9hq,I have used tidymodels packages many times,I work in industry,Q5_2,20,Supervised feature selection,NA
+R_2YQcmuwDQM0L9hq,I have used tidymodels packages many times,I work in industry,Q5_3,1,Probability calibration (post modeling),NA
+R_2YQcmuwDQM0L9hq,I have used tidymodels packages many times,I work in industry,Q5_4,3,Probability threshold optimization,NA
+R_2YQcmuwDQM0L9hq,I have used tidymodels packages many times,I work in industry,Q5_5,15,Spatial analysis models and methods,NA
+R_2YQcmuwDQM0L9hq,I have used tidymodels packages many times,I work in industry,Q5_6,30,Better serialization tools ,NA
+R_2YQcmuwDQM0L9hq,I have used tidymodels packages many times,I work in industry,Q5_10,30,H2O.ai support ,NA
+R_2YQcmuwDQM0L9hq,I have used tidymodels packages many times,I work in industry,Q5_12,0,Other,NA
+R_ezFDKgI4W5W3d3r,I have used tidymodels packages many times,I work in industry,Q5_1,30,Model fairness analysis and metrics,NA
+R_ezFDKgI4W5W3d3r,I have used tidymodels packages many times,I work in industry,Q5_2,10,Supervised feature selection,NA
+R_ezFDKgI4W5W3d3r,I have used tidymodels packages many times,I work in industry,Q5_3,30,Probability calibration (post modeling),NA
+R_ezFDKgI4W5W3d3r,I have used tidymodels packages many times,I work in industry,Q5_4,30,Probability threshold optimization,NA
+R_ezFDKgI4W5W3d3r,I have used tidymodels packages many times,I work in industry,Q5_5,0,Spatial analysis models and methods,NA
+R_ezFDKgI4W5W3d3r,I have used tidymodels packages many times,I work in industry,Q5_6,0,Better serialization tools ,NA
+R_ezFDKgI4W5W3d3r,I have used tidymodels packages many times,I work in industry,Q5_10,0,H2O.ai support ,NA
+R_ezFDKgI4W5W3d3r,I have used tidymodels packages many times,I work in industry,Q5_12,0,Other,NA
+R_2uL0BWkNtbqSX93,I have used tidymodels packages many times,I work in industry,Q5_1,0,Model fairness analysis and metrics,NA
+R_2uL0BWkNtbqSX93,I have used tidymodels packages many times,I work in industry,Q5_2,100,Supervised feature selection,NA
+R_2uL0BWkNtbqSX93,I have used tidymodels packages many times,I work in industry,Q5_3,0,Probability calibration (post modeling),NA
+R_2uL0BWkNtbqSX93,I have used tidymodels packages many times,I work in industry,Q5_4,0,Probability threshold optimization,NA
+R_2uL0BWkNtbqSX93,I have used tidymodels packages many times,I work in industry,Q5_5,0,Spatial analysis models and methods,NA
+R_2uL0BWkNtbqSX93,I have used tidymodels packages many times,I work in industry,Q5_6,0,Better serialization tools ,NA
+R_2uL0BWkNtbqSX93,I have used tidymodels packages many times,I work in industry,Q5_10,0,H2O.ai support ,NA
+R_2uL0BWkNtbqSX93,I have used tidymodels packages many times,I work in industry,Q5_12,0,Other,NA
+R_1H1dkezuIdkl7K3,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_1,0,Model fairness analysis and metrics,NA
+R_1H1dkezuIdkl7K3,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_2,34,Supervised feature selection,NA
+R_1H1dkezuIdkl7K3,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_3,33,Probability calibration (post modeling),NA
+R_1H1dkezuIdkl7K3,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_4,33,Probability threshold optimization,NA
+R_1H1dkezuIdkl7K3,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_5,0,Spatial analysis models and methods,NA
+R_1H1dkezuIdkl7K3,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_6,0,Better serialization tools ,NA
+R_1H1dkezuIdkl7K3,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_10,0,H2O.ai support ,NA
+R_1H1dkezuIdkl7K3,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_12,0,Other,NA
+R_3mmzG9lSnHGrgtU,I have used tidymodels packages a few times,I work in industry,Q5_1,5,Model fairness analysis and metrics,NA
+R_3mmzG9lSnHGrgtU,I have used tidymodels packages a few times,I work in industry,Q5_2,15,Supervised feature selection,NA
+R_3mmzG9lSnHGrgtU,I have used tidymodels packages a few times,I work in industry,Q5_3,5,Probability calibration (post modeling),NA
+R_3mmzG9lSnHGrgtU,I have used tidymodels packages a few times,I work in industry,Q5_4,10,Probability threshold optimization,NA
+R_3mmzG9lSnHGrgtU,I have used tidymodels packages a few times,I work in industry,Q5_5,35,Spatial analysis models and methods,NA
+R_3mmzG9lSnHGrgtU,I have used tidymodels packages a few times,I work in industry,Q5_6,5,Better serialization tools ,NA
+R_3mmzG9lSnHGrgtU,I have used tidymodels packages a few times,I work in industry,Q5_10,25,H2O.ai support ,NA
+R_3mmzG9lSnHGrgtU,I have used tidymodels packages a few times,I work in industry,Q5_12,0,Other,NA
+R_3qqW5wqb0Sv29Vk,I have used tidymodels packages a few times,I work in industry,Q5_1,10,Model fairness analysis and metrics,NA
+R_3qqW5wqb0Sv29Vk,I have used tidymodels packages a few times,I work in industry,Q5_2,10,Supervised feature selection,NA
+R_3qqW5wqb0Sv29Vk,I have used tidymodels packages a few times,I work in industry,Q5_3,20,Probability calibration (post modeling),NA
+R_3qqW5wqb0Sv29Vk,I have used tidymodels packages a few times,I work in industry,Q5_4,10,Probability threshold optimization,NA
+R_3qqW5wqb0Sv29Vk,I have used tidymodels packages a few times,I work in industry,Q5_5,10,Spatial analysis models and methods,NA
+R_3qqW5wqb0Sv29Vk,I have used tidymodels packages a few times,I work in industry,Q5_6,0,Better serialization tools ,NA
+R_3qqW5wqb0Sv29Vk,I have used tidymodels packages a few times,I work in industry,Q5_10,0,H2O.ai support ,NA
+R_3qqW5wqb0Sv29Vk,I have used tidymodels packages a few times,I work in industry,Q5_12,40,Other,docs/tutorials
+R_2P5Ka3KNqJKmpaB,I have used tidymodels packages a few times,I work in industry,Q5_1,50,Model fairness analysis and metrics,NA
+R_2P5Ka3KNqJKmpaB,I have used tidymodels packages a few times,I work in industry,Q5_2,0,Supervised feature selection,NA
+R_2P5Ka3KNqJKmpaB,I have used tidymodels packages a few times,I work in industry,Q5_3,50,Probability calibration (post modeling),NA
+R_2P5Ka3KNqJKmpaB,I have used tidymodels packages a few times,I work in industry,Q5_4,0,Probability threshold optimization,NA
+R_2P5Ka3KNqJKmpaB,I have used tidymodels packages a few times,I work in industry,Q5_5,0,Spatial analysis models and methods,NA
+R_2P5Ka3KNqJKmpaB,I have used tidymodels packages a few times,I work in industry,Q5_6,0,Better serialization tools ,NA
+R_2P5Ka3KNqJKmpaB,I have used tidymodels packages a few times,I work in industry,Q5_10,0,H2O.ai support ,NA
+R_2P5Ka3KNqJKmpaB,I have used tidymodels packages a few times,I work in industry,Q5_12,0,Other,NA
+R_2CTdbCdBROgJTUH,I have used tidymodels packages many times,I work in industry,Q5_1,0,Model fairness analysis and metrics,NA
+R_2CTdbCdBROgJTUH,I have used tidymodels packages many times,I work in industry,Q5_2,20,Supervised feature selection,NA
+R_2CTdbCdBROgJTUH,I have used tidymodels packages many times,I work in industry,Q5_3,30,Probability calibration (post modeling),NA
+R_2CTdbCdBROgJTUH,I have used tidymodels packages many times,I work in industry,Q5_4,30,Probability threshold optimization,NA
+R_2CTdbCdBROgJTUH,I have used tidymodels packages many times,I work in industry,Q5_5,5,Spatial analysis models and methods,NA
+R_2CTdbCdBROgJTUH,I have used tidymodels packages many times,I work in industry,Q5_6,15,Better serialization tools ,NA
+R_2CTdbCdBROgJTUH,I have used tidymodels packages many times,I work in industry,Q5_10,0,H2O.ai support ,NA
+R_2CTdbCdBROgJTUH,I have used tidymodels packages many times,I work in industry,Q5_12,0,Other,NA
+R_2QiBDQyN4OVdkbr,I have used tidymodels packages a few times,I work in industry,Q5_1,0,Model fairness analysis and metrics,NA
+R_2QiBDQyN4OVdkbr,I have used tidymodels packages a few times,I work in industry,Q5_2,50,Supervised feature selection,NA
+R_2QiBDQyN4OVdkbr,I have used tidymodels packages a few times,I work in industry,Q5_3,0,Probability calibration (post modeling),NA
+R_2QiBDQyN4OVdkbr,I have used tidymodels packages a few times,I work in industry,Q5_4,0,Probability threshold optimization,NA
+R_2QiBDQyN4OVdkbr,I have used tidymodels packages a few times,I work in industry,Q5_5,0,Spatial analysis models and methods,NA
+R_2QiBDQyN4OVdkbr,I have used tidymodels packages a few times,I work in industry,Q5_6,0,Better serialization tools ,NA
+R_2QiBDQyN4OVdkbr,I have used tidymodels packages a few times,I work in industry,Q5_10,50,H2O.ai support ,NA
+R_2QiBDQyN4OVdkbr,I have used tidymodels packages a few times,I work in industry,Q5_12,0,Other,NA
+R_3HCa9mt6UDKm8iB,I have used tidymodels packages a few times,I work in industry,Q5_1,0,Model fairness analysis and metrics,NA
+R_3HCa9mt6UDKm8iB,I have used tidymodels packages a few times,I work in industry,Q5_2,0,Supervised feature selection,NA
+R_3HCa9mt6UDKm8iB,I have used tidymodels packages a few times,I work in industry,Q5_3,20,Probability calibration (post modeling),NA
+R_3HCa9mt6UDKm8iB,I have used tidymodels packages a few times,I work in industry,Q5_4,10,Probability threshold optimization,NA
+R_3HCa9mt6UDKm8iB,I have used tidymodels packages a few times,I work in industry,Q5_5,0,Spatial analysis models and methods,NA
+R_3HCa9mt6UDKm8iB,I have used tidymodels packages a few times,I work in industry,Q5_6,0,Better serialization tools ,NA
+R_3HCa9mt6UDKm8iB,I have used tidymodels packages a few times,I work in industry,Q5_10,70,H2O.ai support ,NA
+R_3HCa9mt6UDKm8iB,I have used tidymodels packages a few times,I work in industry,Q5_12,0,Other,NA
+R_1QMZK1w0h16cNTT,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_1,0,Model fairness analysis and metrics,NA
+R_1QMZK1w0h16cNTT,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_2,25,Supervised feature selection,NA
+R_1QMZK1w0h16cNTT,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_3,0,Probability calibration (post modeling),NA
+R_1QMZK1w0h16cNTT,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_4,25,Probability threshold optimization,NA
+R_1QMZK1w0h16cNTT,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_5,0,Spatial analysis models and methods,NA
+R_1QMZK1w0h16cNTT,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_6,50,Better serialization tools ,NA
+R_1QMZK1w0h16cNTT,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_10,0,H2O.ai support ,NA
+R_1QMZK1w0h16cNTT,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_12,0,Other,NA
+R_2SIAnRoloSym0vd,I have used tidymodels packages a few times,I am a student,Q5_1,20,Model fairness analysis and metrics,NA
+R_2SIAnRoloSym0vd,I have used tidymodels packages a few times,I am a student,Q5_2,0,Supervised feature selection,NA
+R_2SIAnRoloSym0vd,I have used tidymodels packages a few times,I am a student,Q5_3,0,Probability calibration (post modeling),NA
+R_2SIAnRoloSym0vd,I have used tidymodels packages a few times,I am a student,Q5_4,0,Probability threshold optimization,NA
+R_2SIAnRoloSym0vd,I have used tidymodels packages a few times,I am a student,Q5_5,80,Spatial analysis models and methods,NA
+R_2SIAnRoloSym0vd,I have used tidymodels packages a few times,I am a student,Q5_6,0,Better serialization tools ,NA
+R_2SIAnRoloSym0vd,I have used tidymodels packages a few times,I am a student,Q5_10,0,H2O.ai support ,NA
+R_2SIAnRoloSym0vd,I have used tidymodels packages a few times,I am a student,Q5_12,0,Other,NA
+R_1ltVH5Ovl5iEz22,I have used tidymodels packages many times,I work in industry,Q5_1,0,Model fairness analysis and metrics,NA
+R_1ltVH5Ovl5iEz22,I have used tidymodels packages many times,I work in industry,Q5_2,10,Supervised feature selection,NA
+R_1ltVH5Ovl5iEz22,I have used tidymodels packages many times,I work in industry,Q5_3,40,Probability calibration (post modeling),NA
+R_1ltVH5Ovl5iEz22,I have used tidymodels packages many times,I work in industry,Q5_4,20,Probability threshold optimization,NA
+R_1ltVH5Ovl5iEz22,I have used tidymodels packages many times,I work in industry,Q5_5,0,Spatial analysis models and methods,NA
+R_1ltVH5Ovl5iEz22,I have used tidymodels packages many times,I work in industry,Q5_6,30,Better serialization tools ,NA
+R_1ltVH5Ovl5iEz22,I have used tidymodels packages many times,I work in industry,Q5_10,0,H2O.ai support ,NA
+R_1ltVH5Ovl5iEz22,I have used tidymodels packages many times,I work in industry,Q5_12,0,Other,NA
+R_2vkt30aWKdoNUt1,I have used tidymodels packages many times,I work in industry,Q5_1,0,Model fairness analysis and metrics,NA
+R_2vkt30aWKdoNUt1,I have used tidymodels packages many times,I work in industry,Q5_2,0,Supervised feature selection,NA
+R_2vkt30aWKdoNUt1,I have used tidymodels packages many times,I work in industry,Q5_3,20,Probability calibration (post modeling),NA
+R_2vkt30aWKdoNUt1,I have used tidymodels packages many times,I work in industry,Q5_4,0,Probability threshold optimization,NA
+R_2vkt30aWKdoNUt1,I have used tidymodels packages many times,I work in industry,Q5_5,10,Spatial analysis models and methods,NA
+R_2vkt30aWKdoNUt1,I have used tidymodels packages many times,I work in industry,Q5_6,0,Better serialization tools ,NA
+R_2vkt30aWKdoNUt1,I have used tidymodels packages many times,I work in industry,Q5_10,30,H2O.ai support ,NA
+R_2vkt30aWKdoNUt1,I have used tidymodels packages many times,I work in industry,Q5_12,40,Other,Deep learning modeling
+R_28Utt1AHW6QCY77,I have used tidymodels packages many times,I work in industry,Q5_1,0,Model fairness analysis and metrics,NA
+R_28Utt1AHW6QCY77,I have used tidymodels packages many times,I work in industry,Q5_2,20,Supervised feature selection,NA
+R_28Utt1AHW6QCY77,I have used tidymodels packages many times,I work in industry,Q5_3,0,Probability calibration (post modeling),NA
+R_28Utt1AHW6QCY77,I have used tidymodels packages many times,I work in industry,Q5_4,0,Probability threshold optimization,NA
+R_28Utt1AHW6QCY77,I have used tidymodels packages many times,I work in industry,Q5_5,0,Spatial analysis models and methods,NA
+R_28Utt1AHW6QCY77,I have used tidymodels packages many times,I work in industry,Q5_6,10,Better serialization tools ,NA
+R_28Utt1AHW6QCY77,I have used tidymodels packages many times,I work in industry,Q5_10,30,H2O.ai support ,NA
+R_28Utt1AHW6QCY77,I have used tidymodels packages many times,I work in industry,Q5_12,40,Other,"Tools for simpler model deployment with plumber, Git Actions or cloud"
+R_xhl1R6qZBe4cnhn,I have contributed to tidymodels packages or taught others how to use them,I am a student,Q5_1,30,Model fairness analysis and metrics,NA
+R_xhl1R6qZBe4cnhn,I have contributed to tidymodels packages or taught others how to use them,I am a student,Q5_2,0,Supervised feature selection,NA
+R_xhl1R6qZBe4cnhn,I have contributed to tidymodels packages or taught others how to use them,I am a student,Q5_3,10,Probability calibration (post modeling),NA
+R_xhl1R6qZBe4cnhn,I have contributed to tidymodels packages or taught others how to use them,I am a student,Q5_4,10,Probability threshold optimization,NA
+R_xhl1R6qZBe4cnhn,I have contributed to tidymodels packages or taught others how to use them,I am a student,Q5_5,40,Spatial analysis models and methods,NA
+R_xhl1R6qZBe4cnhn,I have contributed to tidymodels packages or taught others how to use them,I am a student,Q5_6,5,Better serialization tools ,NA
+R_xhl1R6qZBe4cnhn,I have contributed to tidymodels packages or taught others how to use them,I am a student,Q5_10,5,H2O.ai support ,NA
+R_xhl1R6qZBe4cnhn,I have contributed to tidymodels packages or taught others how to use them,I am a student,Q5_12,0,Other,NA
+R_12sDD08l0sPzHjM,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_1,50,Model fairness analysis and metrics,NA
+R_12sDD08l0sPzHjM,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_2,0,Supervised feature selection,NA
+R_12sDD08l0sPzHjM,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_3,0,Probability calibration (post modeling),NA
+R_12sDD08l0sPzHjM,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_4,0,Probability threshold optimization,NA
+R_12sDD08l0sPzHjM,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_5,50,Spatial analysis models and methods,NA
+R_12sDD08l0sPzHjM,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_6,0,Better serialization tools ,NA
+R_12sDD08l0sPzHjM,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_10,0,H2O.ai support ,NA
+R_12sDD08l0sPzHjM,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_12,0,Other,NA
+R_2zAqsiNGuJUpSgR,I have used tidymodels packages a few times,I am a hobbyist,Q5_1,45,Model fairness analysis and metrics,NA
+R_2zAqsiNGuJUpSgR,I have used tidymodels packages a few times,I am a hobbyist,Q5_2,50,Supervised feature selection,NA
+R_2zAqsiNGuJUpSgR,I have used tidymodels packages a few times,I am a hobbyist,Q5_3,0,Probability calibration (post modeling),NA
+R_2zAqsiNGuJUpSgR,I have used tidymodels packages a few times,I am a hobbyist,Q5_4,0,Probability threshold optimization,NA
+R_2zAqsiNGuJUpSgR,I have used tidymodels packages a few times,I am a hobbyist,Q5_5,5,Spatial analysis models and methods,NA
+R_2zAqsiNGuJUpSgR,I have used tidymodels packages a few times,I am a hobbyist,Q5_6,0,Better serialization tools ,NA
+R_2zAqsiNGuJUpSgR,I have used tidymodels packages a few times,I am a hobbyist,Q5_10,0,H2O.ai support ,NA
+R_2zAqsiNGuJUpSgR,I have used tidymodels packages a few times,I am a hobbyist,Q5_12,0,Other,NA
+R_1GV1boglJDMPEzb,I have used tidymodels packages many times,I work in industry,Q5_1,10,Model fairness analysis and metrics,NA
+R_1GV1boglJDMPEzb,I have used tidymodels packages many times,I work in industry,Q5_2,10,Supervised feature selection,NA
+R_1GV1boglJDMPEzb,I have used tidymodels packages many times,I work in industry,Q5_3,0,Probability calibration (post modeling),NA
+R_1GV1boglJDMPEzb,I have used tidymodels packages many times,I work in industry,Q5_4,40,Probability threshold optimization,NA
+R_1GV1boglJDMPEzb,I have used tidymodels packages many times,I work in industry,Q5_5,10,Spatial analysis models and methods,NA
+R_1GV1boglJDMPEzb,I have used tidymodels packages many times,I work in industry,Q5_6,20,Better serialization tools ,NA
+R_1GV1boglJDMPEzb,I have used tidymodels packages many times,I work in industry,Q5_10,10,H2O.ai support ,NA
+R_1GV1boglJDMPEzb,I have used tidymodels packages many times,I work in industry,Q5_12,0,Other,NA
+R_3M3ShcElKBoVDg2,I have never used tidymodels,"I am an academic, professor, and/or researcher",Q5_1,0,Model fairness analysis and metrics,NA
+R_3M3ShcElKBoVDg2,I have never used tidymodels,"I am an academic, professor, and/or researcher",Q5_2,10,Supervised feature selection,NA
+R_3M3ShcElKBoVDg2,I have never used tidymodels,"I am an academic, professor, and/or researcher",Q5_3,0,Probability calibration (post modeling),NA
+R_3M3ShcElKBoVDg2,I have never used tidymodels,"I am an academic, professor, and/or researcher",Q5_4,50,Probability threshold optimization,NA
+R_3M3ShcElKBoVDg2,I have never used tidymodels,"I am an academic, professor, and/or researcher",Q5_5,0,Spatial analysis models and methods,NA
+R_3M3ShcElKBoVDg2,I have never used tidymodels,"I am an academic, professor, and/or researcher",Q5_6,0,Better serialization tools ,NA
+R_3M3ShcElKBoVDg2,I have never used tidymodels,"I am an academic, professor, and/or researcher",Q5_10,40,H2O.ai support ,NA
+R_3M3ShcElKBoVDg2,I have never used tidymodels,"I am an academic, professor, and/or researcher",Q5_12,0,Other,NA
+R_ROI6OOJUEU8aEUh,I have used tidymodels packages many times,I work in industry,Q5_1,0,Model fairness analysis and metrics,NA
+R_ROI6OOJUEU8aEUh,I have used tidymodels packages many times,I work in industry,Q5_2,90,Supervised feature selection,NA
+R_ROI6OOJUEU8aEUh,I have used tidymodels packages many times,I work in industry,Q5_3,5,Probability calibration (post modeling),NA
+R_ROI6OOJUEU8aEUh,I have used tidymodels packages many times,I work in industry,Q5_4,5,Probability threshold optimization,NA
+R_ROI6OOJUEU8aEUh,I have used tidymodels packages many times,I work in industry,Q5_5,0,Spatial analysis models and methods,NA
+R_ROI6OOJUEU8aEUh,I have used tidymodels packages many times,I work in industry,Q5_6,0,Better serialization tools ,NA
+R_ROI6OOJUEU8aEUh,I have used tidymodels packages many times,I work in industry,Q5_10,0,H2O.ai support ,NA
+R_ROI6OOJUEU8aEUh,I have used tidymodels packages many times,I work in industry,Q5_12,0,Other,NA
+R_WxIw6smhQvn9c65,I have used tidymodels packages many times,I work in industry,Q5_1,50,Model fairness analysis and metrics,NA
+R_WxIw6smhQvn9c65,I have used tidymodels packages many times,I work in industry,Q5_2,0,Supervised feature selection,NA
+R_WxIw6smhQvn9c65,I have used tidymodels packages many times,I work in industry,Q5_3,50,Probability calibration (post modeling),NA
+R_WxIw6smhQvn9c65,I have used tidymodels packages many times,I work in industry,Q5_4,0,Probability threshold optimization,NA
+R_WxIw6smhQvn9c65,I have used tidymodels packages many times,I work in industry,Q5_5,0,Spatial analysis models and methods,NA
+R_WxIw6smhQvn9c65,I have used tidymodels packages many times,I work in industry,Q5_6,0,Better serialization tools ,NA
+R_WxIw6smhQvn9c65,I have used tidymodels packages many times,I work in industry,Q5_10,0,H2O.ai support ,NA
+R_WxIw6smhQvn9c65,I have used tidymodels packages many times,I work in industry,Q5_12,0,Other,NA
+R_2E3LzZ1HdYEvt0g,I have used tidymodels packages a few times,I am a hobbyist,Q5_1,10,Model fairness analysis and metrics,NA
+R_2E3LzZ1HdYEvt0g,I have used tidymodels packages a few times,I am a hobbyist,Q5_2,10,Supervised feature selection,NA
+R_2E3LzZ1HdYEvt0g,I have used tidymodels packages a few times,I am a hobbyist,Q5_3,20,Probability calibration (post modeling),NA
+R_2E3LzZ1HdYEvt0g,I have used tidymodels packages a few times,I am a hobbyist,Q5_4,20,Probability threshold optimization,NA
+R_2E3LzZ1HdYEvt0g,I have used tidymodels packages a few times,I am a hobbyist,Q5_5,0,Spatial analysis models and methods,NA
+R_2E3LzZ1HdYEvt0g,I have used tidymodels packages a few times,I am a hobbyist,Q5_6,0,Better serialization tools ,NA
+R_2E3LzZ1HdYEvt0g,I have used tidymodels packages a few times,I am a hobbyist,Q5_10,40,H2O.ai support ,NA
+R_2E3LzZ1HdYEvt0g,I have used tidymodels packages a few times,I am a hobbyist,Q5_12,0,Other,NA
+R_3L0urY0MSIzi24E,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_1,0,Model fairness analysis and metrics,NA
+R_3L0urY0MSIzi24E,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_2,50,Supervised feature selection,NA
+R_3L0urY0MSIzi24E,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_3,0,Probability calibration (post modeling),NA
+R_3L0urY0MSIzi24E,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_4,0,Probability threshold optimization,NA
+R_3L0urY0MSIzi24E,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_5,0,Spatial analysis models and methods,NA
+R_3L0urY0MSIzi24E,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_6,50,Better serialization tools ,NA
+R_3L0urY0MSIzi24E,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_10,0,H2O.ai support ,NA
+R_3L0urY0MSIzi24E,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_12,0,Other,NA
+R_2VCSY4NpLIHWvMJ,I have used tidymodels packages many times,I work in industry,Q5_1,0,Model fairness analysis and metrics,NA
+R_2VCSY4NpLIHWvMJ,I have used tidymodels packages many times,I work in industry,Q5_2,30,Supervised feature selection,NA
+R_2VCSY4NpLIHWvMJ,I have used tidymodels packages many times,I work in industry,Q5_3,0,Probability calibration (post modeling),NA
+R_2VCSY4NpLIHWvMJ,I have used tidymodels packages many times,I work in industry,Q5_4,30,Probability threshold optimization,NA
+R_2VCSY4NpLIHWvMJ,I have used tidymodels packages many times,I work in industry,Q5_5,20,Spatial analysis models and methods,NA
+R_2VCSY4NpLIHWvMJ,I have used tidymodels packages many times,I work in industry,Q5_6,0,Better serialization tools ,NA
+R_2VCSY4NpLIHWvMJ,I have used tidymodels packages many times,I work in industry,Q5_10,0,H2O.ai support ,NA
+R_2VCSY4NpLIHWvMJ,I have used tidymodels packages many times,I work in industry,Q5_12,20,Other,spark integration
+R_2rvmolBqWiJKtiK,I have used tidymodels packages a few times,I work in industry,Q5_1,5,Model fairness analysis and metrics,NA
+R_2rvmolBqWiJKtiK,I have used tidymodels packages a few times,I work in industry,Q5_2,75,Supervised feature selection,NA
+R_2rvmolBqWiJKtiK,I have used tidymodels packages a few times,I work in industry,Q5_3,15,Probability calibration (post modeling),NA
+R_2rvmolBqWiJKtiK,I have used tidymodels packages a few times,I work in industry,Q5_4,5,Probability threshold optimization,NA
+R_2rvmolBqWiJKtiK,I have used tidymodels packages a few times,I work in industry,Q5_5,0,Spatial analysis models and methods,NA
+R_2rvmolBqWiJKtiK,I have used tidymodels packages a few times,I work in industry,Q5_6,0,Better serialization tools ,NA
+R_2rvmolBqWiJKtiK,I have used tidymodels packages a few times,I work in industry,Q5_10,0,H2O.ai support ,NA
+R_2rvmolBqWiJKtiK,I have used tidymodels packages a few times,I work in industry,Q5_12,0,Other,NA
+R_3G2kPIt3uYnpJTC,I have used tidymodels packages a few times,I work in industry,Q5_1,20,Model fairness analysis and metrics,NA
+R_3G2kPIt3uYnpJTC,I have used tidymodels packages a few times,I work in industry,Q5_2,10,Supervised feature selection,NA
+R_3G2kPIt3uYnpJTC,I have used tidymodels packages a few times,I work in industry,Q5_3,10,Probability calibration (post modeling),NA
+R_3G2kPIt3uYnpJTC,I have used tidymodels packages a few times,I work in industry,Q5_4,10,Probability threshold optimization,NA
+R_3G2kPIt3uYnpJTC,I have used tidymodels packages a few times,I work in industry,Q5_5,20,Spatial analysis models and methods,NA
+R_3G2kPIt3uYnpJTC,I have used tidymodels packages a few times,I work in industry,Q5_6,30,Better serialization tools ,NA
+R_3G2kPIt3uYnpJTC,I have used tidymodels packages a few times,I work in industry,Q5_10,0,H2O.ai support ,NA
+R_3G2kPIt3uYnpJTC,I have used tidymodels packages a few times,I work in industry,Q5_12,0,Other,NA
+R_WeaGJoz1kL8hLpf,I have used tidymodels packages a few times,I am a student,Q5_1,25,Model fairness analysis and metrics,NA
+R_WeaGJoz1kL8hLpf,I have used tidymodels packages a few times,I am a student,Q5_2,0,Supervised feature selection,NA
+R_WeaGJoz1kL8hLpf,I have used tidymodels packages a few times,I am a student,Q5_3,0,Probability calibration (post modeling),NA
+R_WeaGJoz1kL8hLpf,I have used tidymodels packages a few times,I am a student,Q5_4,25,Probability threshold optimization,NA
+R_WeaGJoz1kL8hLpf,I have used tidymodels packages a few times,I am a student,Q5_5,25,Spatial analysis models and methods,NA
+R_WeaGJoz1kL8hLpf,I have used tidymodels packages a few times,I am a student,Q5_6,25,Better serialization tools ,NA
+R_WeaGJoz1kL8hLpf,I have used tidymodels packages a few times,I am a student,Q5_10,0,H2O.ai support ,NA
+R_WeaGJoz1kL8hLpf,I have used tidymodels packages a few times,I am a student,Q5_12,0,Other,NA
+R_1rAEXBKArtZnmlO,I have used tidymodels packages many times,I work in industry,Q5_1,20,Model fairness analysis and metrics,NA
+R_1rAEXBKArtZnmlO,I have used tidymodels packages many times,I work in industry,Q5_2,40,Supervised feature selection,NA
+R_1rAEXBKArtZnmlO,I have used tidymodels packages many times,I work in industry,Q5_3,20,Probability calibration (post modeling),NA
+R_1rAEXBKArtZnmlO,I have used tidymodels packages many times,I work in industry,Q5_4,10,Probability threshold optimization,NA
+R_1rAEXBKArtZnmlO,I have used tidymodels packages many times,I work in industry,Q5_5,0,Spatial analysis models and methods,NA
+R_1rAEXBKArtZnmlO,I have used tidymodels packages many times,I work in industry,Q5_6,10,Better serialization tools ,NA
+R_1rAEXBKArtZnmlO,I have used tidymodels packages many times,I work in industry,Q5_10,0,H2O.ai support ,NA
+R_1rAEXBKArtZnmlO,I have used tidymodels packages many times,I work in industry,Q5_12,0,Other,NA
+R_2uVYFnqVqKXO781,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_1,10,Model fairness analysis and metrics,NA
+R_2uVYFnqVqKXO781,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_2,30,Supervised feature selection,NA
+R_2uVYFnqVqKXO781,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_3,0,Probability calibration (post modeling),NA
+R_2uVYFnqVqKXO781,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_4,0,Probability threshold optimization,NA
+R_2uVYFnqVqKXO781,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_5,20,Spatial analysis models and methods,NA
+R_2uVYFnqVqKXO781,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_6,20,Better serialization tools ,NA
+R_2uVYFnqVqKXO781,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_10,20,H2O.ai support ,NA
+R_2uVYFnqVqKXO781,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_12,0,Other,NA
+R_33xs3OTISxp4icq,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_1,0,Model fairness analysis and metrics,NA
+R_33xs3OTISxp4icq,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_2,0,Supervised feature selection,NA
+R_33xs3OTISxp4icq,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_3,100,Probability calibration (post modeling),NA
+R_33xs3OTISxp4icq,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_4,0,Probability threshold optimization,NA
+R_33xs3OTISxp4icq,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_5,0,Spatial analysis models and methods,NA
+R_33xs3OTISxp4icq,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_6,0,Better serialization tools ,NA
+R_33xs3OTISxp4icq,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_10,0,H2O.ai support ,NA
+R_33xs3OTISxp4icq,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_12,0,Other,NA
+R_1rDOpXsTgip6Jue,I have used tidymodels packages many times,I work in industry,Q5_1,30,Model fairness analysis and metrics,NA
+R_1rDOpXsTgip6Jue,I have used tidymodels packages many times,I work in industry,Q5_2,10,Supervised feature selection,NA
+R_1rDOpXsTgip6Jue,I have used tidymodels packages many times,I work in industry,Q5_3,10,Probability calibration (post modeling),NA
+R_1rDOpXsTgip6Jue,I have used tidymodels packages many times,I work in industry,Q5_4,0,Probability threshold optimization,NA
+R_1rDOpXsTgip6Jue,I have used tidymodels packages many times,I work in industry,Q5_5,0,Spatial analysis models and methods,NA
+R_1rDOpXsTgip6Jue,I have used tidymodels packages many times,I work in industry,Q5_6,20,Better serialization tools ,NA
+R_1rDOpXsTgip6Jue,I have used tidymodels packages many times,I work in industry,Q5_10,30,H2O.ai support ,NA
+R_1rDOpXsTgip6Jue,I have used tidymodels packages many times,I work in industry,Q5_12,0,Other,NA
+R_2WUASi6mbzFypC5,I have used tidymodels packages many times,I work in industry,Q5_1,5,Model fairness analysis and metrics,NA
+R_2WUASi6mbzFypC5,I have used tidymodels packages many times,I work in industry,Q5_2,50,Supervised feature selection,NA
+R_2WUASi6mbzFypC5,I have used tidymodels packages many times,I work in industry,Q5_3,5,Probability calibration (post modeling),NA
+R_2WUASi6mbzFypC5,I have used tidymodels packages many times,I work in industry,Q5_4,10,Probability threshold optimization,NA
+R_2WUASi6mbzFypC5,I have used tidymodels packages many times,I work in industry,Q5_5,0,Spatial analysis models and methods,NA
+R_2WUASi6mbzFypC5,I have used tidymodels packages many times,I work in industry,Q5_6,5,Better serialization tools ,NA
+R_2WUASi6mbzFypC5,I have used tidymodels packages many times,I work in industry,Q5_10,5,H2O.ai support ,NA
+R_2WUASi6mbzFypC5,I have used tidymodels packages many times,I work in industry,Q5_12,20,Other,Tuning hyperparameters (finetune library)
+R_3QYqkFuHaRi6xJm,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_1,0,Model fairness analysis and metrics,NA
+R_3QYqkFuHaRi6xJm,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_2,50,Supervised feature selection,NA
+R_3QYqkFuHaRi6xJm,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_3,0,Probability calibration (post modeling),NA
+R_3QYqkFuHaRi6xJm,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_4,0,Probability threshold optimization,NA
+R_3QYqkFuHaRi6xJm,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_5,50,Spatial analysis models and methods,NA
+R_3QYqkFuHaRi6xJm,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_6,0,Better serialization tools ,NA
+R_3QYqkFuHaRi6xJm,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_10,0,H2O.ai support ,NA
+R_3QYqkFuHaRi6xJm,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_12,0,Other,NA
+R_1GviJAQFW7d7xyd,I have used tidymodels packages a few times,I work in industry,Q5_1,20,Model fairness analysis and metrics,NA
+R_1GviJAQFW7d7xyd,I have used tidymodels packages a few times,I work in industry,Q5_2,20,Supervised feature selection,NA
+R_1GviJAQFW7d7xyd,I have used tidymodels packages a few times,I work in industry,Q5_3,15,Probability calibration (post modeling),NA
+R_1GviJAQFW7d7xyd,I have used tidymodels packages a few times,I work in industry,Q5_4,20,Probability threshold optimization,NA
+R_1GviJAQFW7d7xyd,I have used tidymodels packages a few times,I work in industry,Q5_5,0,Spatial analysis models and methods,NA
+R_1GviJAQFW7d7xyd,I have used tidymodels packages a few times,I work in industry,Q5_6,25,Better serialization tools ,NA
+R_1GviJAQFW7d7xyd,I have used tidymodels packages a few times,I work in industry,Q5_10,0,H2O.ai support ,NA
+R_1GviJAQFW7d7xyd,I have used tidymodels packages a few times,I work in industry,Q5_12,0,Other,NA
+R_2Sf2xkP2fHvHKsm,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_1,0,Model fairness analysis and metrics,NA
+R_2Sf2xkP2fHvHKsm,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_2,50,Supervised feature selection,NA
+R_2Sf2xkP2fHvHKsm,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_3,0,Probability calibration (post modeling),NA
+R_2Sf2xkP2fHvHKsm,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_4,0,Probability threshold optimization,NA
+R_2Sf2xkP2fHvHKsm,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_5,50,Spatial analysis models and methods,NA
+R_2Sf2xkP2fHvHKsm,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_6,0,Better serialization tools ,NA
+R_2Sf2xkP2fHvHKsm,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_10,0,H2O.ai support ,NA
+R_2Sf2xkP2fHvHKsm,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_12,0,Other,NA
+R_31XGWTVkZUC28VN,I have never used tidymodels,"I am an academic, professor, and/or researcher",Q5_1,0,Model fairness analysis and metrics,NA
+R_31XGWTVkZUC28VN,I have never used tidymodels,"I am an academic, professor, and/or researcher",Q5_2,0,Supervised feature selection,NA
+R_31XGWTVkZUC28VN,I have never used tidymodels,"I am an academic, professor, and/or researcher",Q5_3,0,Probability calibration (post modeling),NA
+R_31XGWTVkZUC28VN,I have never used tidymodels,"I am an academic, professor, and/or researcher",Q5_4,0,Probability threshold optimization,NA
+R_31XGWTVkZUC28VN,I have never used tidymodels,"I am an academic, professor, and/or researcher",Q5_5,0,Spatial analysis models and methods,NA
+R_31XGWTVkZUC28VN,I have never used tidymodels,"I am an academic, professor, and/or researcher",Q5_6,0,Better serialization tools ,NA
+R_31XGWTVkZUC28VN,I have never used tidymodels,"I am an academic, professor, and/or researcher",Q5_10,0,H2O.ai support ,NA
+R_31XGWTVkZUC28VN,I have never used tidymodels,"I am an academic, professor, and/or researcher",Q5_12,100,Other,teaching tools
+R_1DFRHF3nbBPzfQa,I have used tidymodels packages many times,I work in industry,Q5_1,5,Model fairness analysis and metrics,NA
+R_1DFRHF3nbBPzfQa,I have used tidymodels packages many times,I work in industry,Q5_2,10,Supervised feature selection,NA
+R_1DFRHF3nbBPzfQa,I have used tidymodels packages many times,I work in industry,Q5_3,50,Probability calibration (post modeling),NA
+R_1DFRHF3nbBPzfQa,I have used tidymodels packages many times,I work in industry,Q5_4,10,Probability threshold optimization,NA
+R_1DFRHF3nbBPzfQa,I have used tidymodels packages many times,I work in industry,Q5_5,10,Spatial analysis models and methods,NA
+R_1DFRHF3nbBPzfQa,I have used tidymodels packages many times,I work in industry,Q5_6,0,Better serialization tools ,NA
+R_1DFRHF3nbBPzfQa,I have used tidymodels packages many times,I work in industry,Q5_10,0,H2O.ai support ,NA
+R_1DFRHF3nbBPzfQa,I have used tidymodels packages many times,I work in industry,Q5_12,15,Other,Case weights
+R_3JKNC4UXi54v3yy,I have used tidymodels packages a few times,I am a student,Q5_1,0,Model fairness analysis and metrics,NA
+R_3JKNC4UXi54v3yy,I have used tidymodels packages a few times,I am a student,Q5_2,50,Supervised feature selection,NA
+R_3JKNC4UXi54v3yy,I have used tidymodels packages a few times,I am a student,Q5_3,0,Probability calibration (post modeling),NA
+R_3JKNC4UXi54v3yy,I have used tidymodels packages a few times,I am a student,Q5_4,0,Probability threshold optimization,NA
+R_3JKNC4UXi54v3yy,I have used tidymodels packages a few times,I am a student,Q5_5,20,Spatial analysis models and methods,NA
+R_3JKNC4UXi54v3yy,I have used tidymodels packages a few times,I am a student,Q5_6,30,Better serialization tools ,NA
+R_3JKNC4UXi54v3yy,I have used tidymodels packages a few times,I am a student,Q5_10,0,H2O.ai support ,NA
+R_3JKNC4UXi54v3yy,I have used tidymodels packages a few times,I am a student,Q5_12,0,Other,NA
+R_3HjHTWvQL6SDTR6,I have used tidymodels packages a few times,I work in industry,Q5_1,5,Model fairness analysis and metrics,NA
+R_3HjHTWvQL6SDTR6,I have used tidymodels packages a few times,I work in industry,Q5_2,5,Supervised feature selection,NA
+R_3HjHTWvQL6SDTR6,I have used tidymodels packages a few times,I work in industry,Q5_3,15,Probability calibration (post modeling),NA
+R_3HjHTWvQL6SDTR6,I have used tidymodels packages a few times,I work in industry,Q5_4,30,Probability threshold optimization,NA
+R_3HjHTWvQL6SDTR6,I have used tidymodels packages a few times,I work in industry,Q5_5,0,Spatial analysis models and methods,NA
+R_3HjHTWvQL6SDTR6,I have used tidymodels packages a few times,I work in industry,Q5_6,5,Better serialization tools ,NA
+R_3HjHTWvQL6SDTR6,I have used tidymodels packages a few times,I work in industry,Q5_10,40,H2O.ai support ,NA
+R_3HjHTWvQL6SDTR6,I have used tidymodels packages a few times,I work in industry,Q5_12,0,Other,NA
+R_3PovAEnX2PLK8TB,I have used tidymodels packages many times,I work in industry,Q5_1,0,Model fairness analysis and metrics,NA
+R_3PovAEnX2PLK8TB,I have used tidymodels packages many times,I work in industry,Q5_2,0,Supervised feature selection,NA
+R_3PovAEnX2PLK8TB,I have used tidymodels packages many times,I work in industry,Q5_3,50,Probability calibration (post modeling),NA
+R_3PovAEnX2PLK8TB,I have used tidymodels packages many times,I work in industry,Q5_4,25,Probability threshold optimization,NA
+R_3PovAEnX2PLK8TB,I have used tidymodels packages many times,I work in industry,Q5_5,0,Spatial analysis models and methods,NA
+R_3PovAEnX2PLK8TB,I have used tidymodels packages many times,I work in industry,Q5_6,25,Better serialization tools ,NA
+R_3PovAEnX2PLK8TB,I have used tidymodels packages many times,I work in industry,Q5_10,0,H2O.ai support ,NA
+R_3PovAEnX2PLK8TB,I have used tidymodels packages many times,I work in industry,Q5_12,0,Other,NA
+R_12QOzmMytd5MGg9,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_1,15,Model fairness analysis and metrics,NA
+R_12QOzmMytd5MGg9,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_2,60,Supervised feature selection,NA
+R_12QOzmMytd5MGg9,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_3,10,Probability calibration (post modeling),NA
+R_12QOzmMytd5MGg9,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_4,15,Probability threshold optimization,NA
+R_12QOzmMytd5MGg9,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_5,0,Spatial analysis models and methods,NA
+R_12QOzmMytd5MGg9,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_6,0,Better serialization tools ,NA
+R_12QOzmMytd5MGg9,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_10,0,H2O.ai support ,NA
+R_12QOzmMytd5MGg9,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_12,0,Other,NA
+R_1LdIHFSmlt0oiRs,I have contributed to tidymodels packages or taught others how to use them,"I am an academic, professor, and/or researcher",Q5_1,0,Model fairness analysis and metrics,NA
+R_1LdIHFSmlt0oiRs,I have contributed to tidymodels packages or taught others how to use them,"I am an academic, professor, and/or researcher",Q5_2,30,Supervised feature selection,NA
+R_1LdIHFSmlt0oiRs,I have contributed to tidymodels packages or taught others how to use them,"I am an academic, professor, and/or researcher",Q5_3,0,Probability calibration (post modeling),NA
+R_1LdIHFSmlt0oiRs,I have contributed to tidymodels packages or taught others how to use them,"I am an academic, professor, and/or researcher",Q5_4,0,Probability threshold optimization,NA
+R_1LdIHFSmlt0oiRs,I have contributed to tidymodels packages or taught others how to use them,"I am an academic, professor, and/or researcher",Q5_5,30,Spatial analysis models and methods,NA
+R_1LdIHFSmlt0oiRs,I have contributed to tidymodels packages or taught others how to use them,"I am an academic, professor, and/or researcher",Q5_6,0,Better serialization tools ,NA
+R_1LdIHFSmlt0oiRs,I have contributed to tidymodels packages or taught others how to use them,"I am an academic, professor, and/or researcher",Q5_10,40,H2O.ai support ,NA
+R_1LdIHFSmlt0oiRs,I have contributed to tidymodels packages or taught others how to use them,"I am an academic, professor, and/or researcher",Q5_12,0,Other,NA
+R_1JJxQC0cgMw8LhS,I have used tidymodels packages many times,I work in industry,Q5_1,0,Model fairness analysis and metrics,NA
+R_1JJxQC0cgMw8LhS,I have used tidymodels packages many times,I work in industry,Q5_2,20,Supervised feature selection,NA
+R_1JJxQC0cgMw8LhS,I have used tidymodels packages many times,I work in industry,Q5_3,0,Probability calibration (post modeling),NA
+R_1JJxQC0cgMw8LhS,I have used tidymodels packages many times,I work in industry,Q5_4,50,Probability threshold optimization,NA
+R_1JJxQC0cgMw8LhS,I have used tidymodels packages many times,I work in industry,Q5_5,0,Spatial analysis models and methods,NA
+R_1JJxQC0cgMw8LhS,I have used tidymodels packages many times,I work in industry,Q5_6,30,Better serialization tools ,NA
+R_1JJxQC0cgMw8LhS,I have used tidymodels packages many times,I work in industry,Q5_10,0,H2O.ai support ,NA
+R_1JJxQC0cgMw8LhS,I have used tidymodels packages many times,I work in industry,Q5_12,0,Other,NA
+R_2V8sjSEw5VvbHvY,I have used tidymodels packages a few times,I work in industry,Q5_1,10,Model fairness analysis and metrics,NA
+R_2V8sjSEw5VvbHvY,I have used tidymodels packages a few times,I work in industry,Q5_2,20,Supervised feature selection,NA
+R_2V8sjSEw5VvbHvY,I have used tidymodels packages a few times,I work in industry,Q5_3,35,Probability calibration (post modeling),NA
+R_2V8sjSEw5VvbHvY,I have used tidymodels packages a few times,I work in industry,Q5_4,5,Probability threshold optimization,NA
+R_2V8sjSEw5VvbHvY,I have used tidymodels packages a few times,I work in industry,Q5_5,0,Spatial analysis models and methods,NA
+R_2V8sjSEw5VvbHvY,I have used tidymodels packages a few times,I work in industry,Q5_6,0,Better serialization tools ,NA
+R_2V8sjSEw5VvbHvY,I have used tidymodels packages a few times,I work in industry,Q5_10,30,H2O.ai support ,NA
+R_2V8sjSEw5VvbHvY,I have used tidymodels packages a few times,I work in industry,Q5_12,0,Other,NA
+R_1nTw2JsngyyJxAM,I have used tidymodels packages a few times,I work in industry,Q5_1,0,Model fairness analysis and metrics,NA
+R_1nTw2JsngyyJxAM,I have used tidymodels packages a few times,I work in industry,Q5_2,0,Supervised feature selection,NA
+R_1nTw2JsngyyJxAM,I have used tidymodels packages a few times,I work in industry,Q5_3,50,Probability calibration (post modeling),NA
+R_1nTw2JsngyyJxAM,I have used tidymodels packages a few times,I work in industry,Q5_4,20,Probability threshold optimization,NA
+R_1nTw2JsngyyJxAM,I have used tidymodels packages a few times,I work in industry,Q5_5,0,Spatial analysis models and methods,NA
+R_1nTw2JsngyyJxAM,I have used tidymodels packages a few times,I work in industry,Q5_6,30,Better serialization tools ,NA
+R_1nTw2JsngyyJxAM,I have used tidymodels packages a few times,I work in industry,Q5_10,0,H2O.ai support ,NA
+R_1nTw2JsngyyJxAM,I have used tidymodels packages a few times,I work in industry,Q5_12,0,Other,NA
+R_2CWC88DEtyLhHPM,I have used tidymodels packages many times,I work in industry,Q5_1,5,Model fairness analysis and metrics,NA
+R_2CWC88DEtyLhHPM,I have used tidymodels packages many times,I work in industry,Q5_2,0,Supervised feature selection,NA
+R_2CWC88DEtyLhHPM,I have used tidymodels packages many times,I work in industry,Q5_3,10,Probability calibration (post modeling),NA
+R_2CWC88DEtyLhHPM,I have used tidymodels packages many times,I work in industry,Q5_4,10,Probability threshold optimization,NA
+R_2CWC88DEtyLhHPM,I have used tidymodels packages many times,I work in industry,Q5_5,0,Spatial analysis models and methods,NA
+R_2CWC88DEtyLhHPM,I have used tidymodels packages many times,I work in industry,Q5_6,5,Better serialization tools ,NA
+R_2CWC88DEtyLhHPM,I have used tidymodels packages many times,I work in industry,Q5_10,20,H2O.ai support ,NA
+R_2CWC88DEtyLhHPM,I have used tidymodels packages many times,I work in industry,Q5_12,50,Other,Matching algorithm and feature parity to scikit-learn
+R_3smHcmHTeVQWUyG,I have used tidymodels packages many times,I work in industry,Q5_1,10,Model fairness analysis and metrics,NA
+R_3smHcmHTeVQWUyG,I have used tidymodels packages many times,I work in industry,Q5_2,80,Supervised feature selection,NA
+R_3smHcmHTeVQWUyG,I have used tidymodels packages many times,I work in industry,Q5_3,0,Probability calibration (post modeling),NA
+R_3smHcmHTeVQWUyG,I have used tidymodels packages many times,I work in industry,Q5_4,0,Probability threshold optimization,NA
+R_3smHcmHTeVQWUyG,I have used tidymodels packages many times,I work in industry,Q5_5,0,Spatial analysis models and methods,NA
+R_3smHcmHTeVQWUyG,I have used tidymodels packages many times,I work in industry,Q5_6,0,Better serialization tools ,NA
+R_3smHcmHTeVQWUyG,I have used tidymodels packages many times,I work in industry,Q5_10,10,H2O.ai support ,NA
+R_3smHcmHTeVQWUyG,I have used tidymodels packages many times,I work in industry,Q5_12,0,Other,NA
+R_2ylql3Bn4hC7Ypg,I have used tidymodels packages many times,I work in industry,Q5_1,20,Model fairness analysis and metrics,NA
+R_2ylql3Bn4hC7Ypg,I have used tidymodels packages many times,I work in industry,Q5_2,50,Supervised feature selection,NA
+R_2ylql3Bn4hC7Ypg,I have used tidymodels packages many times,I work in industry,Q5_3,10,Probability calibration (post modeling),NA
+R_2ylql3Bn4hC7Ypg,I have used tidymodels packages many times,I work in industry,Q5_4,0,Probability threshold optimization,NA
+R_2ylql3Bn4hC7Ypg,I have used tidymodels packages many times,I work in industry,Q5_5,0,Spatial analysis models and methods,NA
+R_2ylql3Bn4hC7Ypg,I have used tidymodels packages many times,I work in industry,Q5_6,20,Better serialization tools ,NA
+R_2ylql3Bn4hC7Ypg,I have used tidymodels packages many times,I work in industry,Q5_10,0,H2O.ai support ,NA
+R_2ylql3Bn4hC7Ypg,I have used tidymodels packages many times,I work in industry,Q5_12,0,Other,NA
+R_3KrNfhd3bqLkxdE,I have used tidymodels packages a few times,I work in industry,Q5_1,20,Model fairness analysis and metrics,NA
+R_3KrNfhd3bqLkxdE,I have used tidymodels packages a few times,I work in industry,Q5_2,20,Supervised feature selection,NA
+R_3KrNfhd3bqLkxdE,I have used tidymodels packages a few times,I work in industry,Q5_3,20,Probability calibration (post modeling),NA
+R_3KrNfhd3bqLkxdE,I have used tidymodels packages a few times,I work in industry,Q5_4,20,Probability threshold optimization,NA
+R_3KrNfhd3bqLkxdE,I have used tidymodels packages a few times,I work in industry,Q5_5,0,Spatial analysis models and methods,NA
+R_3KrNfhd3bqLkxdE,I have used tidymodels packages a few times,I work in industry,Q5_6,20,Better serialization tools ,NA
+R_3KrNfhd3bqLkxdE,I have used tidymodels packages a few times,I work in industry,Q5_10,0,H2O.ai support ,NA
+R_3KrNfhd3bqLkxdE,I have used tidymodels packages a few times,I work in industry,Q5_12,0,Other,NA
+R_PBALUmRR4eKBqvf,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_1,20,Model fairness analysis and metrics,NA
+R_PBALUmRR4eKBqvf,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_2,0,Supervised feature selection,NA
+R_PBALUmRR4eKBqvf,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_3,20,Probability calibration (post modeling),NA
+R_PBALUmRR4eKBqvf,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_4,50,Probability threshold optimization,NA
+R_PBALUmRR4eKBqvf,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_5,0,Spatial analysis models and methods,NA
+R_PBALUmRR4eKBqvf,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_6,10,Better serialization tools ,NA
+R_PBALUmRR4eKBqvf,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_10,0,H2O.ai support ,NA
+R_PBALUmRR4eKBqvf,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_12,0,Other,NA
+R_1DYhB3NQunHFEMs,I have contributed to tidymodels packages or taught others how to use them,"I am an academic, professor, and/or researcher",Q5_1,0,Model fairness analysis and metrics,NA
+R_1DYhB3NQunHFEMs,I have contributed to tidymodels packages or taught others how to use them,"I am an academic, professor, and/or researcher",Q5_2,33,Supervised feature selection,NA
+R_1DYhB3NQunHFEMs,I have contributed to tidymodels packages or taught others how to use them,"I am an academic, professor, and/or researcher",Q5_3,33,Probability calibration (post modeling),NA
+R_1DYhB3NQunHFEMs,I have contributed to tidymodels packages or taught others how to use them,"I am an academic, professor, and/or researcher",Q5_4,33,Probability threshold optimization,NA
+R_1DYhB3NQunHFEMs,I have contributed to tidymodels packages or taught others how to use them,"I am an academic, professor, and/or researcher",Q5_5,0,Spatial analysis models and methods,NA
+R_1DYhB3NQunHFEMs,I have contributed to tidymodels packages or taught others how to use them,"I am an academic, professor, and/or researcher",Q5_6,1,Better serialization tools ,NA
+R_1DYhB3NQunHFEMs,I have contributed to tidymodels packages or taught others how to use them,"I am an academic, professor, and/or researcher",Q5_10,0,H2O.ai support ,NA
+R_1DYhB3NQunHFEMs,I have contributed to tidymodels packages or taught others how to use them,"I am an academic, professor, and/or researcher",Q5_12,0,Other,NA
+R_1CqHWxg15g5Zu1Y,I have never used tidymodels,I am a student,Q5_1,30,Model fairness analysis and metrics,NA
+R_1CqHWxg15g5Zu1Y,I have never used tidymodels,I am a student,Q5_2,50,Supervised feature selection,NA
+R_1CqHWxg15g5Zu1Y,I have never used tidymodels,I am a student,Q5_3,0,Probability calibration (post modeling),NA
+R_1CqHWxg15g5Zu1Y,I have never used tidymodels,I am a student,Q5_4,20,Probability threshold optimization,NA
+R_1CqHWxg15g5Zu1Y,I have never used tidymodels,I am a student,Q5_5,0,Spatial analysis models and methods,NA
+R_1CqHWxg15g5Zu1Y,I have never used tidymodels,I am a student,Q5_6,0,Better serialization tools ,NA
+R_1CqHWxg15g5Zu1Y,I have never used tidymodels,I am a student,Q5_10,0,H2O.ai support ,NA
+R_1CqHWxg15g5Zu1Y,I have never used tidymodels,I am a student,Q5_12,0,Other,NA
+R_vGDxjhbQURZ0Anv,I have never used tidymodels,I work in industry,Q5_1,20,Model fairness analysis and metrics,NA
+R_vGDxjhbQURZ0Anv,I have never used tidymodels,I work in industry,Q5_2,0,Supervised feature selection,NA
+R_vGDxjhbQURZ0Anv,I have never used tidymodels,I work in industry,Q5_3,0,Probability calibration (post modeling),NA
+R_vGDxjhbQURZ0Anv,I have never used tidymodels,I work in industry,Q5_4,0,Probability threshold optimization,NA
+R_vGDxjhbQURZ0Anv,I have never used tidymodels,I work in industry,Q5_5,60,Spatial analysis models and methods,NA
+R_vGDxjhbQURZ0Anv,I have never used tidymodels,I work in industry,Q5_6,20,Better serialization tools ,NA
+R_vGDxjhbQURZ0Anv,I have never used tidymodels,I work in industry,Q5_10,0,H2O.ai support ,NA
+R_vGDxjhbQURZ0Anv,I have never used tidymodels,I work in industry,Q5_12,0,Other,NA
+R_2EsZsFynAqHW6ea,I have never used tidymodels,I am a student,Q5_1,20,Model fairness analysis and metrics,NA
+R_2EsZsFynAqHW6ea,I have never used tidymodels,I am a student,Q5_2,5,Supervised feature selection,NA
+R_2EsZsFynAqHW6ea,I have never used tidymodels,I am a student,Q5_3,10,Probability calibration (post modeling),NA
+R_2EsZsFynAqHW6ea,I have never used tidymodels,I am a student,Q5_4,5,Probability threshold optimization,NA
+R_2EsZsFynAqHW6ea,I have never used tidymodels,I am a student,Q5_5,35,Spatial analysis models and methods,NA
+R_2EsZsFynAqHW6ea,I have never used tidymodels,I am a student,Q5_6,0,Better serialization tools ,NA
+R_2EsZsFynAqHW6ea,I have never used tidymodels,I am a student,Q5_10,25,H2O.ai support ,NA
+R_2EsZsFynAqHW6ea,I have never used tidymodels,I am a student,Q5_12,0,Other,NA
+R_3gWLKpaSF6GAKUF,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_1,0,Model fairness analysis and metrics,NA
+R_3gWLKpaSF6GAKUF,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_2,10,Supervised feature selection,NA
+R_3gWLKpaSF6GAKUF,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_3,0,Probability calibration (post modeling),NA
+R_3gWLKpaSF6GAKUF,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_4,0,Probability threshold optimization,NA
+R_3gWLKpaSF6GAKUF,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_5,0,Spatial analysis models and methods,NA
+R_3gWLKpaSF6GAKUF,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_6,0,Better serialization tools ,NA
+R_3gWLKpaSF6GAKUF,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_10,30,H2O.ai support ,NA
+R_3gWLKpaSF6GAKUF,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_12,60,Other,recipes parallelism and grouping
+R_2gZpYIpLPlLw3o5,I have used tidymodels packages a few times,I work in industry,Q5_1,0,Model fairness analysis and metrics,NA
+R_2gZpYIpLPlLw3o5,I have used tidymodels packages a few times,I work in industry,Q5_2,0,Supervised feature selection,NA
+R_2gZpYIpLPlLw3o5,I have used tidymodels packages a few times,I work in industry,Q5_3,0,Probability calibration (post modeling),NA
+R_2gZpYIpLPlLw3o5,I have used tidymodels packages a few times,I work in industry,Q5_4,0,Probability threshold optimization,NA
+R_2gZpYIpLPlLw3o5,I have used tidymodels packages a few times,I work in industry,Q5_5,0,Spatial analysis models and methods,NA
+R_2gZpYIpLPlLw3o5,I have used tidymodels packages a few times,I work in industry,Q5_6,10,Better serialization tools ,NA
+R_2gZpYIpLPlLw3o5,I have used tidymodels packages a few times,I work in industry,Q5_10,10,H2O.ai support ,NA
+R_2gZpYIpLPlLw3o5,I have used tidymodels packages a few times,I work in industry,Q5_12,80,Other,"monotonicity, database support (scoring and prep)"
+R_2AZttCtkcZOGjwN,I have never used tidymodels,I work in industry,Q5_1,20,Model fairness analysis and metrics,NA
+R_2AZttCtkcZOGjwN,I have never used tidymodels,I work in industry,Q5_2,20,Supervised feature selection,NA
+R_2AZttCtkcZOGjwN,I have never used tidymodels,I work in industry,Q5_3,10,Probability calibration (post modeling),NA
+R_2AZttCtkcZOGjwN,I have never used tidymodels,I work in industry,Q5_4,10,Probability threshold optimization,NA
+R_2AZttCtkcZOGjwN,I have never used tidymodels,I work in industry,Q5_5,20,Spatial analysis models and methods,NA
+R_2AZttCtkcZOGjwN,I have never used tidymodels,I work in industry,Q5_6,20,Better serialization tools ,NA
+R_2AZttCtkcZOGjwN,I have never used tidymodels,I work in industry,Q5_10,0,H2O.ai support ,NA
+R_2AZttCtkcZOGjwN,I have never used tidymodels,I work in industry,Q5_12,0,Other,NA
+R_W6hmhIZMlBXReLL,I have used tidymodels packages a few times,I work in industry,Q5_1,40,Model fairness analysis and metrics,NA
+R_W6hmhIZMlBXReLL,I have used tidymodels packages a few times,I work in industry,Q5_2,50,Supervised feature selection,NA
+R_W6hmhIZMlBXReLL,I have used tidymodels packages a few times,I work in industry,Q5_3,0,Probability calibration (post modeling),NA
+R_W6hmhIZMlBXReLL,I have used tidymodels packages a few times,I work in industry,Q5_4,10,Probability threshold optimization,NA
+R_W6hmhIZMlBXReLL,I have used tidymodels packages a few times,I work in industry,Q5_5,0,Spatial analysis models and methods,NA
+R_W6hmhIZMlBXReLL,I have used tidymodels packages a few times,I work in industry,Q5_6,0,Better serialization tools ,NA
+R_W6hmhIZMlBXReLL,I have used tidymodels packages a few times,I work in industry,Q5_10,0,H2O.ai support ,NA
+R_W6hmhIZMlBXReLL,I have used tidymodels packages a few times,I work in industry,Q5_12,0,Other,NA
+R_31oTwXLcIaL97Tz,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_1,0,Model fairness analysis and metrics,NA
+R_31oTwXLcIaL97Tz,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_2,70,Supervised feature selection,NA
+R_31oTwXLcIaL97Tz,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_3,10,Probability calibration (post modeling),NA
+R_31oTwXLcIaL97Tz,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_4,10,Probability threshold optimization,NA
+R_31oTwXLcIaL97Tz,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_5,0,Spatial analysis models and methods,NA
+R_31oTwXLcIaL97Tz,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_6,10,Better serialization tools ,NA
+R_31oTwXLcIaL97Tz,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_10,0,H2O.ai support ,NA
+R_31oTwXLcIaL97Tz,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_12,0,Other,NA
+R_2axHz2lpAKWG622,I have used tidymodels packages a few times,I work in industry,Q5_1,10,Model fairness analysis and metrics,NA
+R_2axHz2lpAKWG622,I have used tidymodels packages a few times,I work in industry,Q5_2,40,Supervised feature selection,NA
+R_2axHz2lpAKWG622,I have used tidymodels packages a few times,I work in industry,Q5_3,10,Probability calibration (post modeling),NA
+R_2axHz2lpAKWG622,I have used tidymodels packages a few times,I work in industry,Q5_4,10,Probability threshold optimization,NA
+R_2axHz2lpAKWG622,I have used tidymodels packages a few times,I work in industry,Q5_5,10,Spatial analysis models and methods,NA
+R_2axHz2lpAKWG622,I have used tidymodels packages a few times,I work in industry,Q5_6,10,Better serialization tools ,NA
+R_2axHz2lpAKWG622,I have used tidymodels packages a few times,I work in industry,Q5_10,10,H2O.ai support ,NA
+R_2axHz2lpAKWG622,I have used tidymodels packages a few times,I work in industry,Q5_12,0,Other,NA
+R_2PjbndBM9GRM2tI,I have used tidymodels packages a few times,I work in industry,Q5_1,0,Model fairness analysis and metrics,NA
+R_2PjbndBM9GRM2tI,I have used tidymodels packages a few times,I work in industry,Q5_2,20,Supervised feature selection,NA
+R_2PjbndBM9GRM2tI,I have used tidymodels packages a few times,I work in industry,Q5_3,0,Probability calibration (post modeling),NA
+R_2PjbndBM9GRM2tI,I have used tidymodels packages a few times,I work in industry,Q5_4,0,Probability threshold optimization,NA
+R_2PjbndBM9GRM2tI,I have used tidymodels packages a few times,I work in industry,Q5_5,0,Spatial analysis models and methods,NA
+R_2PjbndBM9GRM2tI,I have used tidymodels packages a few times,I work in industry,Q5_6,20,Better serialization tools ,NA
+R_2PjbndBM9GRM2tI,I have used tidymodels packages a few times,I work in industry,Q5_10,60,H2O.ai support ,NA
+R_2PjbndBM9GRM2tI,I have used tidymodels packages a few times,I work in industry,Q5_12,0,Other,NA
+R_3LdtGoyIh5BVLY1,I have used tidymodels packages many times,I work in industry,Q5_1,10,Model fairness analysis and metrics,NA
+R_3LdtGoyIh5BVLY1,I have used tidymodels packages many times,I work in industry,Q5_2,10,Supervised feature selection,NA
+R_3LdtGoyIh5BVLY1,I have used tidymodels packages many times,I work in industry,Q5_3,15,Probability calibration (post modeling),NA
+R_3LdtGoyIh5BVLY1,I have used tidymodels packages many times,I work in industry,Q5_4,15,Probability threshold optimization,NA
+R_3LdtGoyIh5BVLY1,I have used tidymodels packages many times,I work in industry,Q5_5,20,Spatial analysis models and methods,NA
+R_3LdtGoyIh5BVLY1,I have used tidymodels packages many times,I work in industry,Q5_6,30,Better serialization tools ,NA
+R_3LdtGoyIh5BVLY1,I have used tidymodels packages many times,I work in industry,Q5_10,0,H2O.ai support ,NA
+R_3LdtGoyIh5BVLY1,I have used tidymodels packages many times,I work in industry,Q5_12,0,Other,NA
+R_3iqj45VgPuAYVwe,I have used tidymodels packages a few times,I work in industry,Q5_1,10,Model fairness analysis and metrics,NA
+R_3iqj45VgPuAYVwe,I have used tidymodels packages a few times,I work in industry,Q5_2,10,Supervised feature selection,NA
+R_3iqj45VgPuAYVwe,I have used tidymodels packages a few times,I work in industry,Q5_3,15,Probability calibration (post modeling),NA
+R_3iqj45VgPuAYVwe,I have used tidymodels packages a few times,I work in industry,Q5_4,15,Probability threshold optimization,NA
+R_3iqj45VgPuAYVwe,I have used tidymodels packages a few times,I work in industry,Q5_5,0,Spatial analysis models and methods,NA
+R_3iqj45VgPuAYVwe,I have used tidymodels packages a few times,I work in industry,Q5_6,0,Better serialization tools ,NA
+R_3iqj45VgPuAYVwe,I have used tidymodels packages a few times,I work in industry,Q5_10,50,H2O.ai support ,NA
+R_3iqj45VgPuAYVwe,I have used tidymodels packages a few times,I work in industry,Q5_12,0,Other,NA
+R_ZwoQBGLR3umAmOZ,I have used tidymodels packages a few times,I work in industry,Q5_1,0,Model fairness analysis and metrics,NA
+R_ZwoQBGLR3umAmOZ,I have used tidymodels packages a few times,I work in industry,Q5_2,0,Supervised feature selection,NA
+R_ZwoQBGLR3umAmOZ,I have used tidymodels packages a few times,I work in industry,Q5_3,20,Probability calibration (post modeling),NA
+R_ZwoQBGLR3umAmOZ,I have used tidymodels packages a few times,I work in industry,Q5_4,0,Probability threshold optimization,NA
+R_ZwoQBGLR3umAmOZ,I have used tidymodels packages a few times,I work in industry,Q5_5,0,Spatial analysis models and methods,NA
+R_ZwoQBGLR3umAmOZ,I have used tidymodels packages a few times,I work in industry,Q5_6,30,Better serialization tools ,NA
+R_ZwoQBGLR3umAmOZ,I have used tidymodels packages a few times,I work in industry,Q5_10,0,H2O.ai support ,NA
+R_ZwoQBGLR3umAmOZ,I have used tidymodels packages a few times,I work in industry,Q5_12,50,Other,More examples on using TM in production
+R_T6MCMrQXSjN6CT7,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_1,20,Model fairness analysis and metrics,NA
+R_T6MCMrQXSjN6CT7,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_2,30,Supervised feature selection,NA
+R_T6MCMrQXSjN6CT7,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_3,10,Probability calibration (post modeling),NA
+R_T6MCMrQXSjN6CT7,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_4,0,Probability threshold optimization,NA
+R_T6MCMrQXSjN6CT7,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_5,0,Spatial analysis models and methods,NA
+R_T6MCMrQXSjN6CT7,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_6,0,Better serialization tools ,NA
+R_T6MCMrQXSjN6CT7,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_10,20,H2O.ai support ,NA
+R_T6MCMrQXSjN6CT7,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_12,20,Other,Black box models interpretation
+R_2Pp4L1NghVi1NDf,I have used tidymodels packages a few times,I work in industry,Q5_1,10,Model fairness analysis and metrics,NA
+R_2Pp4L1NghVi1NDf,I have used tidymodels packages a few times,I work in industry,Q5_2,0,Supervised feature selection,NA
+R_2Pp4L1NghVi1NDf,I have used tidymodels packages a few times,I work in industry,Q5_3,10,Probability calibration (post modeling),NA
+R_2Pp4L1NghVi1NDf,I have used tidymodels packages a few times,I work in industry,Q5_4,0,Probability threshold optimization,NA
+R_2Pp4L1NghVi1NDf,I have used tidymodels packages a few times,I work in industry,Q5_5,0,Spatial analysis models and methods,NA
+R_2Pp4L1NghVi1NDf,I have used tidymodels packages a few times,I work in industry,Q5_6,10,Better serialization tools ,NA
+R_2Pp4L1NghVi1NDf,I have used tidymodels packages a few times,I work in industry,Q5_10,70,H2O.ai support ,NA
+R_2Pp4L1NghVi1NDf,I have used tidymodels packages a few times,I work in industry,Q5_12,0,Other,NA
+R_udWOWniPt6jt68x,I have used tidymodels packages a few times,I am a hobbyist,Q5_1,10,Model fairness analysis and metrics,NA
+R_udWOWniPt6jt68x,I have used tidymodels packages a few times,I am a hobbyist,Q5_2,20,Supervised feature selection,NA
+R_udWOWniPt6jt68x,I have used tidymodels packages a few times,I am a hobbyist,Q5_3,15,Probability calibration (post modeling),NA
+R_udWOWniPt6jt68x,I have used tidymodels packages a few times,I am a hobbyist,Q5_4,15,Probability threshold optimization,NA
+R_udWOWniPt6jt68x,I have used tidymodels packages a few times,I am a hobbyist,Q5_5,10,Spatial analysis models and methods,NA
+R_udWOWniPt6jt68x,I have used tidymodels packages a few times,I am a hobbyist,Q5_6,25,Better serialization tools ,NA
+R_udWOWniPt6jt68x,I have used tidymodels packages a few times,I am a hobbyist,Q5_10,5,H2O.ai support ,NA
+R_udWOWniPt6jt68x,I have used tidymodels packages a few times,I am a hobbyist,Q5_12,0,Other,NA
+R_3HBxkUH14zvESVw,I have used tidymodels packages many times,I work in industry,Q5_1,20,Model fairness analysis and metrics,NA
+R_3HBxkUH14zvESVw,I have used tidymodels packages many times,I work in industry,Q5_2,20,Supervised feature selection,NA
+R_3HBxkUH14zvESVw,I have used tidymodels packages many times,I work in industry,Q5_3,0,Probability calibration (post modeling),NA
+R_3HBxkUH14zvESVw,I have used tidymodels packages many times,I work in industry,Q5_4,20,Probability threshold optimization,NA
+R_3HBxkUH14zvESVw,I have used tidymodels packages many times,I work in industry,Q5_5,20,Spatial analysis models and methods,NA
+R_3HBxkUH14zvESVw,I have used tidymodels packages many times,I work in industry,Q5_6,0,Better serialization tools ,NA
+R_3HBxkUH14zvESVw,I have used tidymodels packages many times,I work in industry,Q5_10,20,H2O.ai support ,NA
+R_3HBxkUH14zvESVw,I have used tidymodels packages many times,I work in industry,Q5_12,0,Other,NA
+R_QhTqEqA6pw0z3y1,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_1,0,Model fairness analysis and metrics,NA
+R_QhTqEqA6pw0z3y1,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_2,0,Supervised feature selection,NA
+R_QhTqEqA6pw0z3y1,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_3,0,Probability calibration (post modeling),NA
+R_QhTqEqA6pw0z3y1,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_4,0,Probability threshold optimization,NA
+R_QhTqEqA6pw0z3y1,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_5,70,Spatial analysis models and methods,NA
+R_QhTqEqA6pw0z3y1,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_6,30,Better serialization tools ,NA
+R_QhTqEqA6pw0z3y1,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_10,0,H2O.ai support ,NA
+R_QhTqEqA6pw0z3y1,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_12,0,Other,NA
+R_zVaf7IZSibVVbm9,I have used tidymodels packages a few times,I work in industry,Q5_1,0,Model fairness analysis and metrics,NA
+R_zVaf7IZSibVVbm9,I have used tidymodels packages a few times,I work in industry,Q5_2,10,Supervised feature selection,NA
+R_zVaf7IZSibVVbm9,I have used tidymodels packages a few times,I work in industry,Q5_3,20,Probability calibration (post modeling),NA
+R_zVaf7IZSibVVbm9,I have used tidymodels packages a few times,I work in industry,Q5_4,30,Probability threshold optimization,NA
+R_zVaf7IZSibVVbm9,I have used tidymodels packages a few times,I work in industry,Q5_5,0,Spatial analysis models and methods,NA
+R_zVaf7IZSibVVbm9,I have used tidymodels packages a few times,I work in industry,Q5_6,10,Better serialization tools ,NA
+R_zVaf7IZSibVVbm9,I have used tidymodels packages a few times,I work in industry,Q5_10,20,H2O.ai support ,NA
+R_zVaf7IZSibVVbm9,I have used tidymodels packages a few times,I work in industry,Q5_12,10,Other,test framework on kaggle contest
+R_2SCsdKZZBPuXARz,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_1,0,Model fairness analysis and metrics,NA
+R_2SCsdKZZBPuXARz,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_2,20,Supervised feature selection,NA
+R_2SCsdKZZBPuXARz,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_3,25,Probability calibration (post modeling),NA
+R_2SCsdKZZBPuXARz,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_4,25,Probability threshold optimization,NA
+R_2SCsdKZZBPuXARz,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_5,0,Spatial analysis models and methods,NA
+R_2SCsdKZZBPuXARz,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_6,30,Better serialization tools ,NA
+R_2SCsdKZZBPuXARz,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_10,0,H2O.ai support ,NA
+R_2SCsdKZZBPuXARz,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_12,0,Other,NA
+R_2QYBFIXIduw1z8C,I have used tidymodels packages a few times,I work in industry,Q5_1,10,Model fairness analysis and metrics,NA
+R_2QYBFIXIduw1z8C,I have used tidymodels packages a few times,I work in industry,Q5_2,30,Supervised feature selection,NA
+R_2QYBFIXIduw1z8C,I have used tidymodels packages a few times,I work in industry,Q5_3,0,Probability calibration (post modeling),NA
+R_2QYBFIXIduw1z8C,I have used tidymodels packages a few times,I work in industry,Q5_4,0,Probability threshold optimization,NA
+R_2QYBFIXIduw1z8C,I have used tidymodels packages a few times,I work in industry,Q5_5,0,Spatial analysis models and methods,NA
+R_2QYBFIXIduw1z8C,I have used tidymodels packages a few times,I work in industry,Q5_6,25,Better serialization tools ,NA
+R_2QYBFIXIduw1z8C,I have used tidymodels packages a few times,I work in industry,Q5_10,0,H2O.ai support ,NA
+R_2QYBFIXIduw1z8C,I have used tidymodels packages a few times,I work in industry,Q5_12,35,Other,"Easier extensibility, performance and memory usage, documentation, more flexibility in what's allowed"
+R_1ileqiEwbn0iKcq,I have used tidymodels packages a few times,I am a hobbyist,Q5_1,0,Model fairness analysis and metrics,NA
+R_1ileqiEwbn0iKcq,I have used tidymodels packages a few times,I am a hobbyist,Q5_2,5,Supervised feature selection,NA
+R_1ileqiEwbn0iKcq,I have used tidymodels packages a few times,I am a hobbyist,Q5_3,25,Probability calibration (post modeling),NA
+R_1ileqiEwbn0iKcq,I have used tidymodels packages a few times,I am a hobbyist,Q5_4,15,Probability threshold optimization,NA
+R_1ileqiEwbn0iKcq,I have used tidymodels packages a few times,I am a hobbyist,Q5_5,0,Spatial analysis models and methods,NA
+R_1ileqiEwbn0iKcq,I have used tidymodels packages a few times,I am a hobbyist,Q5_6,5,Better serialization tools ,NA
+R_1ileqiEwbn0iKcq,I have used tidymodels packages a few times,I am a hobbyist,Q5_10,50,H2O.ai support ,NA
+R_1ileqiEwbn0iKcq,I have used tidymodels packages a few times,I am a hobbyist,Q5_12,0,Other,NA
+R_3fC7qFH0suUn5EJ,I have used tidymodels packages a few times,I work in industry,Q5_1,0,Model fairness analysis and metrics,NA
+R_3fC7qFH0suUn5EJ,I have used tidymodels packages a few times,I work in industry,Q5_2,20,Supervised feature selection,NA
+R_3fC7qFH0suUn5EJ,I have used tidymodels packages a few times,I work in industry,Q5_3,0,Probability calibration (post modeling),NA
+R_3fC7qFH0suUn5EJ,I have used tidymodels packages a few times,I work in industry,Q5_4,0,Probability threshold optimization,NA
+R_3fC7qFH0suUn5EJ,I have used tidymodels packages a few times,I work in industry,Q5_5,30,Spatial analysis models and methods,NA
+R_3fC7qFH0suUn5EJ,I have used tidymodels packages a few times,I work in industry,Q5_6,0,Better serialization tools ,NA
+R_3fC7qFH0suUn5EJ,I have used tidymodels packages a few times,I work in industry,Q5_10,0,H2O.ai support ,NA
+R_3fC7qFH0suUn5EJ,I have used tidymodels packages a few times,I work in industry,Q5_12,50,Other,Caret
+R_3CZyMwU3KNoh9gd,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_1,0,Model fairness analysis and metrics,NA
+R_3CZyMwU3KNoh9gd,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_2,0,Supervised feature selection,NA
+R_3CZyMwU3KNoh9gd,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_3,0,Probability calibration (post modeling),NA
+R_3CZyMwU3KNoh9gd,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_4,0,Probability threshold optimization,NA
+R_3CZyMwU3KNoh9gd,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_5,100,Spatial analysis models and methods,NA
+R_3CZyMwU3KNoh9gd,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_6,0,Better serialization tools ,NA
+R_3CZyMwU3KNoh9gd,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_10,0,H2O.ai support ,NA
+R_3CZyMwU3KNoh9gd,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_12,0,Other,NA
+R_3fdYnblwPskT4HH,I have used tidymodels packages a few times,I work in industry,Q5_1,20,Model fairness analysis and metrics,NA
+R_3fdYnblwPskT4HH,I have used tidymodels packages a few times,I work in industry,Q5_2,20,Supervised feature selection,NA
+R_3fdYnblwPskT4HH,I have used tidymodels packages a few times,I work in industry,Q5_3,20,Probability calibration (post modeling),NA
+R_3fdYnblwPskT4HH,I have used tidymodels packages a few times,I work in industry,Q5_4,20,Probability threshold optimization,NA
+R_3fdYnblwPskT4HH,I have used tidymodels packages a few times,I work in industry,Q5_5,0,Spatial analysis models and methods,NA
+R_3fdYnblwPskT4HH,I have used tidymodels packages a few times,I work in industry,Q5_6,20,Better serialization tools ,NA
+R_3fdYnblwPskT4HH,I have used tidymodels packages a few times,I work in industry,Q5_10,0,H2O.ai support ,NA
+R_3fdYnblwPskT4HH,I have used tidymodels packages a few times,I work in industry,Q5_12,0,Other,NA
+R_6s1mFOneZbWZbjj,I have used tidymodels packages many times,I work in industry,Q5_1,0,Model fairness analysis and metrics,NA
+R_6s1mFOneZbWZbjj,I have used tidymodels packages many times,I work in industry,Q5_2,20,Supervised feature selection,NA
+R_6s1mFOneZbWZbjj,I have used tidymodels packages many times,I work in industry,Q5_3,50,Probability calibration (post modeling),NA
+R_6s1mFOneZbWZbjj,I have used tidymodels packages many times,I work in industry,Q5_4,20,Probability threshold optimization,NA
+R_6s1mFOneZbWZbjj,I have used tidymodels packages many times,I work in industry,Q5_5,10,Spatial analysis models and methods,NA
+R_6s1mFOneZbWZbjj,I have used tidymodels packages many times,I work in industry,Q5_6,0,Better serialization tools ,NA
+R_6s1mFOneZbWZbjj,I have used tidymodels packages many times,I work in industry,Q5_10,0,H2O.ai support ,NA
+R_6s1mFOneZbWZbjj,I have used tidymodels packages many times,I work in industry,Q5_12,0,Other,NA
+R_xA7SnX4yvjnZBwR,I have used tidymodels packages many times,I work in industry,Q5_1,40,Model fairness analysis and metrics,NA
+R_xA7SnX4yvjnZBwR,I have used tidymodels packages many times,I work in industry,Q5_2,0,Supervised feature selection,NA
+R_xA7SnX4yvjnZBwR,I have used tidymodels packages many times,I work in industry,Q5_3,10,Probability calibration (post modeling),NA
+R_xA7SnX4yvjnZBwR,I have used tidymodels packages many times,I work in industry,Q5_4,20,Probability threshold optimization,NA
+R_xA7SnX4yvjnZBwR,I have used tidymodels packages many times,I work in industry,Q5_5,0,Spatial analysis models and methods,NA
+R_xA7SnX4yvjnZBwR,I have used tidymodels packages many times,I work in industry,Q5_6,0,Better serialization tools ,NA
+R_xA7SnX4yvjnZBwR,I have used tidymodels packages many times,I work in industry,Q5_10,10,H2O.ai support ,NA
+R_xA7SnX4yvjnZBwR,I have used tidymodels packages many times,I work in industry,Q5_12,20,Other,"Adding explainable boosting machines (EBMs) to caret, better tidymodels dependency discovery for renv, post/pre-processing methods for model fairness analysis and bias mitigation according to user-specified fairness metric"
+R_2akujQXypwF19ss,I have used tidymodels packages many times,I work in industry,Q5_1,15,Model fairness analysis and metrics,NA
+R_2akujQXypwF19ss,I have used tidymodels packages many times,I work in industry,Q5_2,15,Supervised feature selection,NA
+R_2akujQXypwF19ss,I have used tidymodels packages many times,I work in industry,Q5_3,25,Probability calibration (post modeling),NA
+R_2akujQXypwF19ss,I have used tidymodels packages many times,I work in industry,Q5_4,5,Probability threshold optimization,NA
+R_2akujQXypwF19ss,I have used tidymodels packages many times,I work in industry,Q5_5,10,Spatial analysis models and methods,NA
+R_2akujQXypwF19ss,I have used tidymodels packages many times,I work in industry,Q5_6,25,Better serialization tools ,NA
+R_2akujQXypwF19ss,I have used tidymodels packages many times,I work in industry,Q5_10,5,H2O.ai support ,NA
+R_2akujQXypwF19ss,I have used tidymodels packages many times,I work in industry,Q5_12,0,Other,NA
+R_ypVIieBYRaQyQ1P,I have used tidymodels packages many times,I work in industry,Q5_1,5,Model fairness analysis and metrics,NA
+R_ypVIieBYRaQyQ1P,I have used tidymodels packages many times,I work in industry,Q5_2,25,Supervised feature selection,NA
+R_ypVIieBYRaQyQ1P,I have used tidymodels packages many times,I work in industry,Q5_3,15,Probability calibration (post modeling),NA
+R_ypVIieBYRaQyQ1P,I have used tidymodels packages many times,I work in industry,Q5_4,15,Probability threshold optimization,NA
+R_ypVIieBYRaQyQ1P,I have used tidymodels packages many times,I work in industry,Q5_5,5,Spatial analysis models and methods,NA
+R_ypVIieBYRaQyQ1P,I have used tidymodels packages many times,I work in industry,Q5_6,18,Better serialization tools ,NA
+R_ypVIieBYRaQyQ1P,I have used tidymodels packages many times,I work in industry,Q5_10,17,H2O.ai support ,NA
+R_ypVIieBYRaQyQ1P,I have used tidymodels packages many times,I work in industry,Q5_12,0,Other,NA
+R_qF1rFYOR6KBaCHL,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_1,10,Model fairness analysis and metrics,NA
+R_qF1rFYOR6KBaCHL,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_2,0,Supervised feature selection,NA
+R_qF1rFYOR6KBaCHL,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_3,5,Probability calibration (post modeling),NA
+R_qF1rFYOR6KBaCHL,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_4,0,Probability threshold optimization,NA
+R_qF1rFYOR6KBaCHL,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_5,80,Spatial analysis models and methods,NA
+R_qF1rFYOR6KBaCHL,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_6,0,Better serialization tools ,NA
+R_qF1rFYOR6KBaCHL,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_10,5,H2O.ai support ,NA
+R_qF1rFYOR6KBaCHL,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_12,0,Other,NA
+R_1mdYS2k9rkDkuah,I have contributed to tidymodels packages or taught others how to use them,"I am an academic, professor, and/or researcher",Q5_1,10,Model fairness analysis and metrics,NA
+R_1mdYS2k9rkDkuah,I have contributed to tidymodels packages or taught others how to use them,"I am an academic, professor, and/or researcher",Q5_2,30,Supervised feature selection,NA
+R_1mdYS2k9rkDkuah,I have contributed to tidymodels packages or taught others how to use them,"I am an academic, professor, and/or researcher",Q5_3,25,Probability calibration (post modeling),NA
+R_1mdYS2k9rkDkuah,I have contributed to tidymodels packages or taught others how to use them,"I am an academic, professor, and/or researcher",Q5_4,15,Probability threshold optimization,NA
+R_1mdYS2k9rkDkuah,I have contributed to tidymodels packages or taught others how to use them,"I am an academic, professor, and/or researcher",Q5_5,10,Spatial analysis models and methods,NA
+R_1mdYS2k9rkDkuah,I have contributed to tidymodels packages or taught others how to use them,"I am an academic, professor, and/or researcher",Q5_6,10,Better serialization tools ,NA
+R_1mdYS2k9rkDkuah,I have contributed to tidymodels packages or taught others how to use them,"I am an academic, professor, and/or researcher",Q5_10,0,H2O.ai support ,NA
+R_1mdYS2k9rkDkuah,I have contributed to tidymodels packages or taught others how to use them,"I am an academic, professor, and/or researcher",Q5_12,0,Other,NA
+R_OpaLEuaLzqXXvgZ,I have used tidymodels packages a few times,I work in industry,Q5_1,30,Model fairness analysis and metrics,NA
+R_OpaLEuaLzqXXvgZ,I have used tidymodels packages a few times,I work in industry,Q5_2,0,Supervised feature selection,NA
+R_OpaLEuaLzqXXvgZ,I have used tidymodels packages a few times,I work in industry,Q5_3,20,Probability calibration (post modeling),NA
+R_OpaLEuaLzqXXvgZ,I have used tidymodels packages a few times,I work in industry,Q5_4,20,Probability threshold optimization,NA
+R_OpaLEuaLzqXXvgZ,I have used tidymodels packages a few times,I work in industry,Q5_5,0,Spatial analysis models and methods,NA
+R_OpaLEuaLzqXXvgZ,I have used tidymodels packages a few times,I work in industry,Q5_6,0,Better serialization tools ,NA
+R_OpaLEuaLzqXXvgZ,I have used tidymodels packages a few times,I work in industry,Q5_10,30,H2O.ai support ,NA
+R_OpaLEuaLzqXXvgZ,I have used tidymodels packages a few times,I work in industry,Q5_12,0,Other,NA
+R_1dKRKTTZurVRgsU,I have used tidymodels packages many times,I am a student,Q5_1,15,Model fairness analysis and metrics,NA
+R_1dKRKTTZurVRgsU,I have used tidymodels packages many times,I am a student,Q5_2,20,Supervised feature selection,NA
+R_1dKRKTTZurVRgsU,I have used tidymodels packages many times,I am a student,Q5_3,15,Probability calibration (post modeling),NA
+R_1dKRKTTZurVRgsU,I have used tidymodels packages many times,I am a student,Q5_4,15,Probability threshold optimization,NA
+R_1dKRKTTZurVRgsU,I have used tidymodels packages many times,I am a student,Q5_5,5,Spatial analysis models and methods,NA
+R_1dKRKTTZurVRgsU,I have used tidymodels packages many times,I am a student,Q5_6,10,Better serialization tools ,NA
+R_1dKRKTTZurVRgsU,I have used tidymodels packages many times,I am a student,Q5_10,5,H2O.ai support ,NA
+R_1dKRKTTZurVRgsU,I have used tidymodels packages many times,I am a student,Q5_12,15,Other,"recipe package, able to create new features based on group by, i.e. means, median within a group"
+R_3NQjscx62rxGX18,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_1,0,Model fairness analysis and metrics,NA
+R_3NQjscx62rxGX18,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_2,60,Supervised feature selection,NA
+R_3NQjscx62rxGX18,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_3,10,Probability calibration (post modeling),NA
+R_3NQjscx62rxGX18,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_4,0,Probability threshold optimization,NA
+R_3NQjscx62rxGX18,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_5,0,Spatial analysis models and methods,NA
+R_3NQjscx62rxGX18,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_6,20,Better serialization tools ,NA
+R_3NQjscx62rxGX18,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_10,0,H2O.ai support ,NA
+R_3NQjscx62rxGX18,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_12,10,Other,other model stacking and ensamble
+R_3ktv5dIPMPzR3wh,I have used tidymodels packages many times,I work in industry,Q5_1,0,Model fairness analysis and metrics,NA
+R_3ktv5dIPMPzR3wh,I have used tidymodels packages many times,I work in industry,Q5_2,0,Supervised feature selection,NA
+R_3ktv5dIPMPzR3wh,I have used tidymodels packages many times,I work in industry,Q5_3,20,Probability calibration (post modeling),NA
+R_3ktv5dIPMPzR3wh,I have used tidymodels packages many times,I work in industry,Q5_4,0,Probability threshold optimization,NA
+R_3ktv5dIPMPzR3wh,I have used tidymodels packages many times,I work in industry,Q5_5,30,Spatial analysis models and methods,NA
+R_3ktv5dIPMPzR3wh,I have used tidymodels packages many times,I work in industry,Q5_6,0,Better serialization tools ,NA
+R_3ktv5dIPMPzR3wh,I have used tidymodels packages many times,I work in industry,Q5_10,0,H2O.ai support ,NA
+R_3ktv5dIPMPzR3wh,I have used tidymodels packages many times,I work in industry,Q5_12,50,Other,Time Series Analysis
+R_3smQdExGXdeXwKc,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_1,50,Model fairness analysis and metrics,NA
+R_3smQdExGXdeXwKc,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_2,0,Supervised feature selection,NA
+R_3smQdExGXdeXwKc,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_3,25,Probability calibration (post modeling),NA
+R_3smQdExGXdeXwKc,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_4,0,Probability threshold optimization,NA
+R_3smQdExGXdeXwKc,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_5,0,Spatial analysis models and methods,NA
+R_3smQdExGXdeXwKc,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_6,25,Better serialization tools ,NA
+R_3smQdExGXdeXwKc,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_10,0,H2O.ai support ,NA
+R_3smQdExGXdeXwKc,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_12,0,Other,NA
+R_3m37QigW6J5uJmR,I have never used tidymodels,I work in industry,Q5_1,10,Model fairness analysis and metrics,NA
+R_3m37QigW6J5uJmR,I have never used tidymodels,I work in industry,Q5_2,15,Supervised feature selection,NA
+R_3m37QigW6J5uJmR,I have never used tidymodels,I work in industry,Q5_3,0,Probability calibration (post modeling),NA
+R_3m37QigW6J5uJmR,I have never used tidymodels,I work in industry,Q5_4,0,Probability threshold optimization,NA
+R_3m37QigW6J5uJmR,I have never used tidymodels,I work in industry,Q5_5,0,Spatial analysis models and methods,NA
+R_3m37QigW6J5uJmR,I have never used tidymodels,I work in industry,Q5_6,25,Better serialization tools ,NA
+R_3m37QigW6J5uJmR,I have never used tidymodels,I work in industry,Q5_10,50,H2O.ai support ,NA
+R_3m37QigW6J5uJmR,I have never used tidymodels,I work in industry,Q5_12,0,Other,NA
+R_3p9AFB4DhwWaQFY,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_1,2,Model fairness analysis and metrics,NA
+R_3p9AFB4DhwWaQFY,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_2,5,Supervised feature selection,NA
+R_3p9AFB4DhwWaQFY,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_3,2,Probability calibration (post modeling),NA
+R_3p9AFB4DhwWaQFY,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_4,10,Probability threshold optimization,NA
+R_3p9AFB4DhwWaQFY,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_5,60,Spatial analysis models and methods,NA
+R_3p9AFB4DhwWaQFY,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_6,15,Better serialization tools ,NA
+R_3p9AFB4DhwWaQFY,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_10,6,H2O.ai support ,NA
+R_3p9AFB4DhwWaQFY,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_12,0,Other,NA
+R_oYKiiiiYsZHfaff,I have used tidymodels packages a few times,I work in industry,Q5_1,20,Model fairness analysis and metrics,NA
+R_oYKiiiiYsZHfaff,I have used tidymodels packages a few times,I work in industry,Q5_2,60,Supervised feature selection,NA
+R_oYKiiiiYsZHfaff,I have used tidymodels packages a few times,I work in industry,Q5_3,0,Probability calibration (post modeling),NA
+R_oYKiiiiYsZHfaff,I have used tidymodels packages a few times,I work in industry,Q5_4,0,Probability threshold optimization,NA
+R_oYKiiiiYsZHfaff,I have used tidymodels packages a few times,I work in industry,Q5_5,0,Spatial analysis models and methods,NA
+R_oYKiiiiYsZHfaff,I have used tidymodels packages a few times,I work in industry,Q5_6,20,Better serialization tools ,NA
+R_oYKiiiiYsZHfaff,I have used tidymodels packages a few times,I work in industry,Q5_10,0,H2O.ai support ,NA
+R_oYKiiiiYsZHfaff,I have used tidymodels packages a few times,I work in industry,Q5_12,0,Other,NA
+R_xAizJESl2n8X3Yl,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_1,80,Model fairness analysis and metrics,NA
+R_xAizJESl2n8X3Yl,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_2,5,Supervised feature selection,NA
+R_xAizJESl2n8X3Yl,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_3,0,Probability calibration (post modeling),NA
+R_xAizJESl2n8X3Yl,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_4,0,Probability threshold optimization,NA
+R_xAizJESl2n8X3Yl,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_5,5,Spatial analysis models and methods,NA
+R_xAizJESl2n8X3Yl,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_6,10,Better serialization tools ,NA
+R_xAizJESl2n8X3Yl,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_10,0,H2O.ai support ,NA
+R_xAizJESl2n8X3Yl,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_12,0,Other,NA
+R_vJhzwXxuJp7QXeN,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_1,30,Model fairness analysis and metrics,NA
+R_vJhzwXxuJp7QXeN,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_2,30,Supervised feature selection,NA
+R_vJhzwXxuJp7QXeN,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_3,30,Probability calibration (post modeling),NA
+R_vJhzwXxuJp7QXeN,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_4,0,Probability threshold optimization,NA
+R_vJhzwXxuJp7QXeN,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_5,10,Spatial analysis models and methods,NA
+R_vJhzwXxuJp7QXeN,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_6,0,Better serialization tools ,NA
+R_vJhzwXxuJp7QXeN,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_10,0,H2O.ai support ,NA
+R_vJhzwXxuJp7QXeN,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_12,0,Other,NA
+R_79waOKOMemqIetP,I have used tidymodels packages a few times,I work in industry,Q5_1,0,Model fairness analysis and metrics,NA
+R_79waOKOMemqIetP,I have used tidymodels packages a few times,I work in industry,Q5_2,15,Supervised feature selection,NA
+R_79waOKOMemqIetP,I have used tidymodels packages a few times,I work in industry,Q5_3,25,Probability calibration (post modeling),NA
+R_79waOKOMemqIetP,I have used tidymodels packages a few times,I work in industry,Q5_4,0,Probability threshold optimization,NA
+R_79waOKOMemqIetP,I have used tidymodels packages a few times,I work in industry,Q5_5,10,Spatial analysis models and methods,NA
+R_79waOKOMemqIetP,I have used tidymodels packages a few times,I work in industry,Q5_6,25,Better serialization tools ,NA
+R_79waOKOMemqIetP,I have used tidymodels packages a few times,I work in industry,Q5_10,25,H2O.ai support ,NA
+R_79waOKOMemqIetP,I have used tidymodels packages a few times,I work in industry,Q5_12,0,Other,NA
+R_1Lqa3GQjrgvJBLy,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_1,20,Model fairness analysis and metrics,NA
+R_1Lqa3GQjrgvJBLy,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_2,10,Supervised feature selection,NA
+R_1Lqa3GQjrgvJBLy,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_3,60,Probability calibration (post modeling),NA
+R_1Lqa3GQjrgvJBLy,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_4,10,Probability threshold optimization,NA
+R_1Lqa3GQjrgvJBLy,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_5,0,Spatial analysis models and methods,NA
+R_1Lqa3GQjrgvJBLy,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_6,0,Better serialization tools ,NA
+R_1Lqa3GQjrgvJBLy,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_10,0,H2O.ai support ,NA
+R_1Lqa3GQjrgvJBLy,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_12,0,Other,NA
+R_3KSJaVaYC4W0xMZ,I have used tidymodels packages a few times,I work in industry,Q5_1,15,Model fairness analysis and metrics,NA
+R_3KSJaVaYC4W0xMZ,I have used tidymodels packages a few times,I work in industry,Q5_2,10,Supervised feature selection,NA
+R_3KSJaVaYC4W0xMZ,I have used tidymodels packages a few times,I work in industry,Q5_3,10,Probability calibration (post modeling),NA
+R_3KSJaVaYC4W0xMZ,I have used tidymodels packages a few times,I work in industry,Q5_4,10,Probability threshold optimization,NA
+R_3KSJaVaYC4W0xMZ,I have used tidymodels packages a few times,I work in industry,Q5_5,20,Spatial analysis models and methods,NA
+R_3KSJaVaYC4W0xMZ,I have used tidymodels packages a few times,I work in industry,Q5_6,10,Better serialization tools ,NA
+R_3KSJaVaYC4W0xMZ,I have used tidymodels packages a few times,I work in industry,Q5_10,25,H2O.ai support ,NA
+R_3KSJaVaYC4W0xMZ,I have used tidymodels packages a few times,I work in industry,Q5_12,0,Other,NA
+R_1P4VXPDGgh9EIW5,I have used tidymodels packages many times,I work in industry,Q5_1,10,Model fairness analysis and metrics,NA
+R_1P4VXPDGgh9EIW5,I have used tidymodels packages many times,I work in industry,Q5_2,20,Supervised feature selection,NA
+R_1P4VXPDGgh9EIW5,I have used tidymodels packages many times,I work in industry,Q5_3,0,Probability calibration (post modeling),NA
+R_1P4VXPDGgh9EIW5,I have used tidymodels packages many times,I work in industry,Q5_4,10,Probability threshold optimization,NA
+R_1P4VXPDGgh9EIW5,I have used tidymodels packages many times,I work in industry,Q5_5,0,Spatial analysis models and methods,NA
+R_1P4VXPDGgh9EIW5,I have used tidymodels packages many times,I work in industry,Q5_6,0,Better serialization tools ,NA
+R_1P4VXPDGgh9EIW5,I have used tidymodels packages many times,I work in industry,Q5_10,0,H2O.ai support ,NA
+R_1P4VXPDGgh9EIW5,I have used tidymodels packages many times,I work in industry,Q5_12,60,Other,"deep lerning, marge timeseries ML packages,marge vip,marge some usual packages in tidymodels"
+R_2viBodgNF1Hun8s,I have used tidymodels packages many times,I work in industry,Q5_1,0,Model fairness analysis and metrics,NA
+R_2viBodgNF1Hun8s,I have used tidymodels packages many times,I work in industry,Q5_2,30,Supervised feature selection,NA
+R_2viBodgNF1Hun8s,I have used tidymodels packages many times,I work in industry,Q5_3,0,Probability calibration (post modeling),NA
+R_2viBodgNF1Hun8s,I have used tidymodels packages many times,I work in industry,Q5_4,0,Probability threshold optimization,NA
+R_2viBodgNF1Hun8s,I have used tidymodels packages many times,I work in industry,Q5_5,0,Spatial analysis models and methods,NA
+R_2viBodgNF1Hun8s,I have used tidymodels packages many times,I work in industry,Q5_6,20,Better serialization tools ,NA
+R_2viBodgNF1Hun8s,I have used tidymodels packages many times,I work in industry,Q5_10,50,H2O.ai support ,NA
+R_2viBodgNF1Hun8s,I have used tidymodels packages many times,I work in industry,Q5_12,0,Other,NA
+R_3HNbTlLZ45LJaHV,I have used tidymodels packages a few times,I am a student,Q5_1,0,Model fairness analysis and metrics,NA
+R_3HNbTlLZ45LJaHV,I have used tidymodels packages a few times,I am a student,Q5_2,10,Supervised feature selection,NA
+R_3HNbTlLZ45LJaHV,I have used tidymodels packages a few times,I am a student,Q5_3,10,Probability calibration (post modeling),NA
+R_3HNbTlLZ45LJaHV,I have used tidymodels packages a few times,I am a student,Q5_4,0,Probability threshold optimization,NA
+R_3HNbTlLZ45LJaHV,I have used tidymodels packages a few times,I am a student,Q5_5,80,Spatial analysis models and methods,NA
+R_3HNbTlLZ45LJaHV,I have used tidymodels packages a few times,I am a student,Q5_6,0,Better serialization tools ,NA
+R_3HNbTlLZ45LJaHV,I have used tidymodels packages a few times,I am a student,Q5_10,0,H2O.ai support ,NA
+R_3HNbTlLZ45LJaHV,I have used tidymodels packages a few times,I am a student,Q5_12,0,Other,NA
+R_3Rxs185vCPR1smb,I have used tidymodels packages many times,I work in industry,Q5_1,0,Model fairness analysis and metrics,NA
+R_3Rxs185vCPR1smb,I have used tidymodels packages many times,I work in industry,Q5_2,30,Supervised feature selection,NA
+R_3Rxs185vCPR1smb,I have used tidymodels packages many times,I work in industry,Q5_3,0,Probability calibration (post modeling),NA
+R_3Rxs185vCPR1smb,I have used tidymodels packages many times,I work in industry,Q5_4,0,Probability threshold optimization,NA
+R_3Rxs185vCPR1smb,I have used tidymodels packages many times,I work in industry,Q5_5,0,Spatial analysis models and methods,NA
+R_3Rxs185vCPR1smb,I have used tidymodels packages many times,I work in industry,Q5_6,40,Better serialization tools ,NA
+R_3Rxs185vCPR1smb,I have used tidymodels packages many times,I work in industry,Q5_10,30,H2O.ai support ,NA
+R_3Rxs185vCPR1smb,I have used tidymodels packages many times,I work in industry,Q5_12,0,Other,NA
+R_0iJzCXSiWGeIAh3,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_1,15,Model fairness analysis and metrics,NA
+R_0iJzCXSiWGeIAh3,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_2,20,Supervised feature selection,NA
+R_0iJzCXSiWGeIAh3,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_3,5,Probability calibration (post modeling),NA
+R_0iJzCXSiWGeIAh3,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_4,5,Probability threshold optimization,NA
+R_0iJzCXSiWGeIAh3,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_5,5,Spatial analysis models and methods,NA
+R_0iJzCXSiWGeIAh3,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_6,20,Better serialization tools ,NA
+R_0iJzCXSiWGeIAh3,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_10,30,H2O.ai support ,NA
+R_0iJzCXSiWGeIAh3,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_12,0,Other,NA
+R_2woE8ymbas9S0l7,I have used tidymodels packages a few times,I work in industry,Q5_1,0,Model fairness analysis and metrics,NA
+R_2woE8ymbas9S0l7,I have used tidymodels packages a few times,I work in industry,Q5_2,25,Supervised feature selection,NA
+R_2woE8ymbas9S0l7,I have used tidymodels packages a few times,I work in industry,Q5_3,0,Probability calibration (post modeling),NA
+R_2woE8ymbas9S0l7,I have used tidymodels packages a few times,I work in industry,Q5_4,0,Probability threshold optimization,NA
+R_2woE8ymbas9S0l7,I have used tidymodels packages a few times,I work in industry,Q5_5,25,Spatial analysis models and methods,NA
+R_2woE8ymbas9S0l7,I have used tidymodels packages a few times,I work in industry,Q5_6,0,Better serialization tools ,NA
+R_2woE8ymbas9S0l7,I have used tidymodels packages a few times,I work in industry,Q5_10,0,H2O.ai support ,NA
+R_2woE8ymbas9S0l7,I have used tidymodels packages a few times,I work in industry,Q5_12,50,Other,Bayesian networks
+R_3D77bW5s5BEkMqa,I have used tidymodels packages many times,I work in industry,Q5_1,0,Model fairness analysis and metrics,NA
+R_3D77bW5s5BEkMqa,I have used tidymodels packages many times,I work in industry,Q5_2,0,Supervised feature selection,NA
+R_3D77bW5s5BEkMqa,I have used tidymodels packages many times,I work in industry,Q5_3,0,Probability calibration (post modeling),NA
+R_3D77bW5s5BEkMqa,I have used tidymodels packages many times,I work in industry,Q5_4,0,Probability threshold optimization,NA
+R_3D77bW5s5BEkMqa,I have used tidymodels packages many times,I work in industry,Q5_5,100,Spatial analysis models and methods,NA
+R_3D77bW5s5BEkMqa,I have used tidymodels packages many times,I work in industry,Q5_6,0,Better serialization tools ,NA
+R_3D77bW5s5BEkMqa,I have used tidymodels packages many times,I work in industry,Q5_10,0,H2O.ai support ,NA
+R_3D77bW5s5BEkMqa,I have used tidymodels packages many times,I work in industry,Q5_12,0,Other,NA
+R_3g1rNOcs9U4ERy4,I have used tidymodels packages many times,I work in industry,Q5_1,5,Model fairness analysis and metrics,NA
+R_3g1rNOcs9U4ERy4,I have used tidymodels packages many times,I work in industry,Q5_2,15,Supervised feature selection,NA
+R_3g1rNOcs9U4ERy4,I have used tidymodels packages many times,I work in industry,Q5_3,10,Probability calibration (post modeling),NA
+R_3g1rNOcs9U4ERy4,I have used tidymodels packages many times,I work in industry,Q5_4,10,Probability threshold optimization,NA
+R_3g1rNOcs9U4ERy4,I have used tidymodels packages many times,I work in industry,Q5_5,20,Spatial analysis models and methods,NA
+R_3g1rNOcs9U4ERy4,I have used tidymodels packages many times,I work in industry,Q5_6,10,Better serialization tools ,NA
+R_3g1rNOcs9U4ERy4,I have used tidymodels packages many times,I work in industry,Q5_10,30,H2O.ai support ,NA
+R_3g1rNOcs9U4ERy4,I have used tidymodels packages many times,I work in industry,Q5_12,0,Other,NA
+R_2boRVPlT5EfzvXj,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_1,40,Model fairness analysis and metrics,NA
+R_2boRVPlT5EfzvXj,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_2,40,Supervised feature selection,NA
+R_2boRVPlT5EfzvXj,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_3,0,Probability calibration (post modeling),NA
+R_2boRVPlT5EfzvXj,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_4,20,Probability threshold optimization,NA
+R_2boRVPlT5EfzvXj,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_5,0,Spatial analysis models and methods,NA
+R_2boRVPlT5EfzvXj,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_6,0,Better serialization tools ,NA
+R_2boRVPlT5EfzvXj,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_10,0,H2O.ai support ,NA
+R_2boRVPlT5EfzvXj,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_12,0,Other,NA
+R_xrb64HTEGYdXs09,I have used tidymodels packages many times,I am a student,Q5_1,0,Model fairness analysis and metrics,NA
+R_xrb64HTEGYdXs09,I have used tidymodels packages many times,I am a student,Q5_2,20,Supervised feature selection,NA
+R_xrb64HTEGYdXs09,I have used tidymodels packages many times,I am a student,Q5_3,20,Probability calibration (post modeling),NA
+R_xrb64HTEGYdXs09,I have used tidymodels packages many times,I am a student,Q5_4,20,Probability threshold optimization,NA
+R_xrb64HTEGYdXs09,I have used tidymodels packages many times,I am a student,Q5_5,20,Spatial analysis models and methods,NA
+R_xrb64HTEGYdXs09,I have used tidymodels packages many times,I am a student,Q5_6,0,Better serialization tools ,NA
+R_xrb64HTEGYdXs09,I have used tidymodels packages many times,I am a student,Q5_10,20,H2O.ai support ,NA
+R_xrb64HTEGYdXs09,I have used tidymodels packages many times,I am a student,Q5_12,0,Other,NA
+R_2aQxeZBeoAujGmc,I have used tidymodels packages a few times,I work in industry,Q5_1,25,Model fairness analysis and metrics,NA
+R_2aQxeZBeoAujGmc,I have used tidymodels packages a few times,I work in industry,Q5_2,0,Supervised feature selection,NA
+R_2aQxeZBeoAujGmc,I have used tidymodels packages a few times,I work in industry,Q5_3,25,Probability calibration (post modeling),NA
+R_2aQxeZBeoAujGmc,I have used tidymodels packages a few times,I work in industry,Q5_4,25,Probability threshold optimization,NA
+R_2aQxeZBeoAujGmc,I have used tidymodels packages a few times,I work in industry,Q5_5,0,Spatial analysis models and methods,NA
+R_2aQxeZBeoAujGmc,I have used tidymodels packages a few times,I work in industry,Q5_6,25,Better serialization tools ,NA
+R_2aQxeZBeoAujGmc,I have used tidymodels packages a few times,I work in industry,Q5_10,0,H2O.ai support ,NA
+R_2aQxeZBeoAujGmc,I have used tidymodels packages a few times,I work in industry,Q5_12,0,Other,NA
+R_3FUMb5hMBkcKgKO,I have used tidymodels packages many times,I work in industry,Q5_1,30,Model fairness analysis and metrics,NA
+R_3FUMb5hMBkcKgKO,I have used tidymodels packages many times,I work in industry,Q5_2,5,Supervised feature selection,NA
+R_3FUMb5hMBkcKgKO,I have used tidymodels packages many times,I work in industry,Q5_3,50,Probability calibration (post modeling),NA
+R_3FUMb5hMBkcKgKO,I have used tidymodels packages many times,I work in industry,Q5_4,0,Probability threshold optimization,NA
+R_3FUMb5hMBkcKgKO,I have used tidymodels packages many times,I work in industry,Q5_5,5,Spatial analysis models and methods,NA
+R_3FUMb5hMBkcKgKO,I have used tidymodels packages many times,I work in industry,Q5_6,5,Better serialization tools ,NA
+R_3FUMb5hMBkcKgKO,I have used tidymodels packages many times,I work in industry,Q5_10,5,H2O.ai support ,NA
+R_3FUMb5hMBkcKgKO,I have used tidymodels packages many times,I work in industry,Q5_12,0,Other,NA
+R_8e2jD70oWSfM1Ox,I have used tidymodels packages a few times,I work in industry,Q5_1,15,Model fairness analysis and metrics,NA
+R_8e2jD70oWSfM1Ox,I have used tidymodels packages a few times,I work in industry,Q5_2,40,Supervised feature selection,NA
+R_8e2jD70oWSfM1Ox,I have used tidymodels packages a few times,I work in industry,Q5_3,0,Probability calibration (post modeling),NA
+R_8e2jD70oWSfM1Ox,I have used tidymodels packages a few times,I work in industry,Q5_4,25,Probability threshold optimization,NA
+R_8e2jD70oWSfM1Ox,I have used tidymodels packages a few times,I work in industry,Q5_5,0,Spatial analysis models and methods,NA
+R_8e2jD70oWSfM1Ox,I have used tidymodels packages a few times,I work in industry,Q5_6,20,Better serialization tools ,NA
+R_8e2jD70oWSfM1Ox,I have used tidymodels packages a few times,I work in industry,Q5_10,0,H2O.ai support ,NA
+R_8e2jD70oWSfM1Ox,I have used tidymodels packages a few times,I work in industry,Q5_12,0,Other,NA
+R_277pARuWJh3koJk,I have used tidymodels packages many times,I work in industry,Q5_1,5,Model fairness analysis and metrics,NA
+R_277pARuWJh3koJk,I have used tidymodels packages many times,I work in industry,Q5_2,30,Supervised feature selection,NA
+R_277pARuWJh3koJk,I have used tidymodels packages many times,I work in industry,Q5_3,5,Probability calibration (post modeling),NA
+R_277pARuWJh3koJk,I have used tidymodels packages many times,I work in industry,Q5_4,10,Probability threshold optimization,NA
+R_277pARuWJh3koJk,I have used tidymodels packages many times,I work in industry,Q5_5,0,Spatial analysis models and methods,NA
+R_277pARuWJh3koJk,I have used tidymodels packages many times,I work in industry,Q5_6,30,Better serialization tools ,NA
+R_277pARuWJh3koJk,I have used tidymodels packages many times,I work in industry,Q5_10,20,H2O.ai support ,NA
+R_277pARuWJh3koJk,I have used tidymodels packages many times,I work in industry,Q5_12,0,Other,NA
+R_3jcbkaHRi3e1tKr,I have used tidymodels packages many times,I work in industry,Q5_1,0,Model fairness analysis and metrics,NA
+R_3jcbkaHRi3e1tKr,I have used tidymodels packages many times,I work in industry,Q5_2,0,Supervised feature selection,NA
+R_3jcbkaHRi3e1tKr,I have used tidymodels packages many times,I work in industry,Q5_3,0,Probability calibration (post modeling),NA
+R_3jcbkaHRi3e1tKr,I have used tidymodels packages many times,I work in industry,Q5_4,0,Probability threshold optimization,NA
+R_3jcbkaHRi3e1tKr,I have used tidymodels packages many times,I work in industry,Q5_5,0,Spatial analysis models and methods,NA
+R_3jcbkaHRi3e1tKr,I have used tidymodels packages many times,I work in industry,Q5_6,0,Better serialization tools ,NA
+R_3jcbkaHRi3e1tKr,I have used tidymodels packages many times,I work in industry,Q5_10,0,H2O.ai support ,NA
+R_3jcbkaHRi3e1tKr,I have used tidymodels packages many times,I work in industry,Q5_12,100,Other,monotonicity
+R_27jNRgOH9botwIj,I have contributed to tidymodels packages or taught others how to use them,"I am an academic, professor, and/or researcher",Q5_1,10,Model fairness analysis and metrics,NA
+R_27jNRgOH9botwIj,I have contributed to tidymodels packages or taught others how to use them,"I am an academic, professor, and/or researcher",Q5_2,65,Supervised feature selection,NA
+R_27jNRgOH9botwIj,I have contributed to tidymodels packages or taught others how to use them,"I am an academic, professor, and/or researcher",Q5_3,5,Probability calibration (post modeling),NA
+R_27jNRgOH9botwIj,I have contributed to tidymodels packages or taught others how to use them,"I am an academic, professor, and/or researcher",Q5_4,20,Probability threshold optimization,NA
+R_27jNRgOH9botwIj,I have contributed to tidymodels packages or taught others how to use them,"I am an academic, professor, and/or researcher",Q5_5,0,Spatial analysis models and methods,NA
+R_27jNRgOH9botwIj,I have contributed to tidymodels packages or taught others how to use them,"I am an academic, professor, and/or researcher",Q5_6,0,Better serialization tools ,NA
+R_27jNRgOH9botwIj,I have contributed to tidymodels packages or taught others how to use them,"I am an academic, professor, and/or researcher",Q5_10,0,H2O.ai support ,NA
+R_27jNRgOH9botwIj,I have contributed to tidymodels packages or taught others how to use them,"I am an academic, professor, and/or researcher",Q5_12,0,Other,NA
+R_5aQf3cjgIBmJ3t7,I have used tidymodels packages many times,I work in industry,Q5_1,5,Model fairness analysis and metrics,NA
+R_5aQf3cjgIBmJ3t7,I have used tidymodels packages many times,I work in industry,Q5_2,5,Supervised feature selection,NA
+R_5aQf3cjgIBmJ3t7,I have used tidymodels packages many times,I work in industry,Q5_3,5,Probability calibration (post modeling),NA
+R_5aQf3cjgIBmJ3t7,I have used tidymodels packages many times,I work in industry,Q5_4,5,Probability threshold optimization,NA
+R_5aQf3cjgIBmJ3t7,I have used tidymodels packages many times,I work in industry,Q5_5,10,Spatial analysis models and methods,NA
+R_5aQf3cjgIBmJ3t7,I have used tidymodels packages many times,I work in industry,Q5_6,20,Better serialization tools ,NA
+R_5aQf3cjgIBmJ3t7,I have used tidymodels packages many times,I work in industry,Q5_10,40,H2O.ai support ,NA
+R_5aQf3cjgIBmJ3t7,I have used tidymodels packages many times,I work in industry,Q5_12,10,Other,deep learning support (example fastai)
+R_1hR4RXhkWfbewpU,I have used tidymodels packages a few times,I work in industry,Q5_1,50,Model fairness analysis and metrics,NA
+R_1hR4RXhkWfbewpU,I have used tidymodels packages a few times,I work in industry,Q5_2,10,Supervised feature selection,NA
+R_1hR4RXhkWfbewpU,I have used tidymodels packages a few times,I work in industry,Q5_3,0,Probability calibration (post modeling),NA
+R_1hR4RXhkWfbewpU,I have used tidymodels packages a few times,I work in industry,Q5_4,0,Probability threshold optimization,NA
+R_1hR4RXhkWfbewpU,I have used tidymodels packages a few times,I work in industry,Q5_5,0,Spatial analysis models and methods,NA
+R_1hR4RXhkWfbewpU,I have used tidymodels packages a few times,I work in industry,Q5_6,25,Better serialization tools ,NA
+R_1hR4RXhkWfbewpU,I have used tidymodels packages a few times,I work in industry,Q5_10,15,H2O.ai support ,NA
+R_1hR4RXhkWfbewpU,I have used tidymodels packages a few times,I work in industry,Q5_12,0,Other,NA
+R_1n0nqxwC1gyyj3e,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_1,75,Model fairness analysis and metrics,NA
+R_1n0nqxwC1gyyj3e,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_2,0,Supervised feature selection,NA
+R_1n0nqxwC1gyyj3e,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_3,0,Probability calibration (post modeling),NA
+R_1n0nqxwC1gyyj3e,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_4,0,Probability threshold optimization,NA
+R_1n0nqxwC1gyyj3e,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_5,0,Spatial analysis models and methods,NA
+R_1n0nqxwC1gyyj3e,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_6,25,Better serialization tools ,NA
+R_1n0nqxwC1gyyj3e,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_10,0,H2O.ai support ,NA
+R_1n0nqxwC1gyyj3e,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_12,0,Other,NA
+R_Rqn6VgszrKD38D7,I have used tidymodels packages many times,I work in industry,Q5_1,0,Model fairness analysis and metrics,NA
+R_Rqn6VgszrKD38D7,I have used tidymodels packages many times,I work in industry,Q5_2,0,Supervised feature selection,NA
+R_Rqn6VgszrKD38D7,I have used tidymodels packages many times,I work in industry,Q5_3,25,Probability calibration (post modeling),NA
+R_Rqn6VgszrKD38D7,I have used tidymodels packages many times,I work in industry,Q5_4,75,Probability threshold optimization,NA
+R_Rqn6VgszrKD38D7,I have used tidymodels packages many times,I work in industry,Q5_5,0,Spatial analysis models and methods,NA
+R_Rqn6VgszrKD38D7,I have used tidymodels packages many times,I work in industry,Q5_6,0,Better serialization tools ,NA
+R_Rqn6VgszrKD38D7,I have used tidymodels packages many times,I work in industry,Q5_10,0,H2O.ai support ,NA
+R_Rqn6VgszrKD38D7,I have used tidymodels packages many times,I work in industry,Q5_12,0,Other,NA
+R_1ptK2FdA5cQsAKl,I have used tidymodels packages many times,I work in industry,Q5_1,0,Model fairness analysis and metrics,NA
+R_1ptK2FdA5cQsAKl,I have used tidymodels packages many times,I work in industry,Q5_2,50,Supervised feature selection,NA
+R_1ptK2FdA5cQsAKl,I have used tidymodels packages many times,I work in industry,Q5_3,20,Probability calibration (post modeling),NA
+R_1ptK2FdA5cQsAKl,I have used tidymodels packages many times,I work in industry,Q5_4,20,Probability threshold optimization,NA
+R_1ptK2FdA5cQsAKl,I have used tidymodels packages many times,I work in industry,Q5_5,0,Spatial analysis models and methods,NA
+R_1ptK2FdA5cQsAKl,I have used tidymodels packages many times,I work in industry,Q5_6,10,Better serialization tools ,NA
+R_1ptK2FdA5cQsAKl,I have used tidymodels packages many times,I work in industry,Q5_10,0,H2O.ai support ,NA
+R_1ptK2FdA5cQsAKl,I have used tidymodels packages many times,I work in industry,Q5_12,0,Other,NA
+R_30bYRl5mEgu9rZe,I have used tidymodels packages many times,I am a student,Q5_1,100,Model fairness analysis and metrics,NA
+R_30bYRl5mEgu9rZe,I have used tidymodels packages many times,I am a student,Q5_2,0,Supervised feature selection,NA
+R_30bYRl5mEgu9rZe,I have used tidymodels packages many times,I am a student,Q5_3,0,Probability calibration (post modeling),NA
+R_30bYRl5mEgu9rZe,I have used tidymodels packages many times,I am a student,Q5_4,0,Probability threshold optimization,NA
+R_30bYRl5mEgu9rZe,I have used tidymodels packages many times,I am a student,Q5_5,0,Spatial analysis models and methods,NA
+R_30bYRl5mEgu9rZe,I have used tidymodels packages many times,I am a student,Q5_6,0,Better serialization tools ,NA
+R_30bYRl5mEgu9rZe,I have used tidymodels packages many times,I am a student,Q5_10,0,H2O.ai support ,NA
+R_30bYRl5mEgu9rZe,I have used tidymodels packages many times,I am a student,Q5_12,0,Other,NA
+R_32KmLsBTLUgJWYs,I have never used tidymodels,"I am an academic, professor, and/or researcher",Q5_1,0,Model fairness analysis and metrics,NA
+R_32KmLsBTLUgJWYs,I have never used tidymodels,"I am an academic, professor, and/or researcher",Q5_2,0,Supervised feature selection,NA
+R_32KmLsBTLUgJWYs,I have never used tidymodels,"I am an academic, professor, and/or researcher",Q5_3,0,Probability calibration (post modeling),NA
+R_32KmLsBTLUgJWYs,I have never used tidymodels,"I am an academic, professor, and/or researcher",Q5_4,0,Probability threshold optimization,NA
+R_32KmLsBTLUgJWYs,I have never used tidymodels,"I am an academic, professor, and/or researcher",Q5_5,0,Spatial analysis models and methods,NA
+R_32KmLsBTLUgJWYs,I have never used tidymodels,"I am an academic, professor, and/or researcher",Q5_6,0,Better serialization tools ,NA
+R_32KmLsBTLUgJWYs,I have never used tidymodels,"I am an academic, professor, and/or researcher",Q5_10,0,H2O.ai support ,NA
+R_32KmLsBTLUgJWYs,I have never used tidymodels,"I am an academic, professor, and/or researcher",Q5_12,100,Other,Convert Code to Python
+R_2fBwvKSAOa0lDNW,I have used tidymodels packages a few times,I work in industry,Q5_1,20,Model fairness analysis and metrics,NA
+R_2fBwvKSAOa0lDNW,I have used tidymodels packages a few times,I work in industry,Q5_2,30,Supervised feature selection,NA
+R_2fBwvKSAOa0lDNW,I have used tidymodels packages a few times,I work in industry,Q5_3,30,Probability calibration (post modeling),NA
+R_2fBwvKSAOa0lDNW,I have used tidymodels packages a few times,I work in industry,Q5_4,20,Probability threshold optimization,NA
+R_2fBwvKSAOa0lDNW,I have used tidymodels packages a few times,I work in industry,Q5_5,0,Spatial analysis models and methods,NA
+R_2fBwvKSAOa0lDNW,I have used tidymodels packages a few times,I work in industry,Q5_6,0,Better serialization tools ,NA
+R_2fBwvKSAOa0lDNW,I have used tidymodels packages a few times,I work in industry,Q5_10,0,H2O.ai support ,NA
+R_2fBwvKSAOa0lDNW,I have used tidymodels packages a few times,I work in industry,Q5_12,0,Other,NA
+R_1NmCQrogXSVmQzG,I have never used tidymodels,"I am an academic, professor, and/or researcher",Q5_1,30,Model fairness analysis and metrics,NA
+R_1NmCQrogXSVmQzG,I have never used tidymodels,"I am an academic, professor, and/or researcher",Q5_2,0,Supervised feature selection,NA
+R_1NmCQrogXSVmQzG,I have never used tidymodels,"I am an academic, professor, and/or researcher",Q5_3,30,Probability calibration (post modeling),NA
+R_1NmCQrogXSVmQzG,I have never used tidymodels,"I am an academic, professor, and/or researcher",Q5_4,30,Probability threshold optimization,NA
+R_1NmCQrogXSVmQzG,I have never used tidymodels,"I am an academic, professor, and/or researcher",Q5_5,10,Spatial analysis models and methods,NA
+R_1NmCQrogXSVmQzG,I have never used tidymodels,"I am an academic, professor, and/or researcher",Q5_6,0,Better serialization tools ,NA
+R_1NmCQrogXSVmQzG,I have never used tidymodels,"I am an academic, professor, and/or researcher",Q5_10,0,H2O.ai support ,NA
+R_1NmCQrogXSVmQzG,I have never used tidymodels,"I am an academic, professor, and/or researcher",Q5_12,0,Other,NA
+R_3P7QMBChzHjWFaR,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_1,30,Model fairness analysis and metrics,NA
+R_3P7QMBChzHjWFaR,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_2,0,Supervised feature selection,NA
+R_3P7QMBChzHjWFaR,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_3,30,Probability calibration (post modeling),NA
+R_3P7QMBChzHjWFaR,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_4,0,Probability threshold optimization,NA
+R_3P7QMBChzHjWFaR,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_5,10,Spatial analysis models and methods,NA
+R_3P7QMBChzHjWFaR,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_6,0,Better serialization tools ,NA
+R_3P7QMBChzHjWFaR,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_10,0,H2O.ai support ,NA
+R_3P7QMBChzHjWFaR,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_12,30,Other,Improved Survival Modeling and Validation
+R_21Bwue7caupkG2t,I have used tidymodels packages a few times,I work in industry,Q5_1,0,Model fairness analysis and metrics,NA
+R_21Bwue7caupkG2t,I have used tidymodels packages a few times,I work in industry,Q5_2,0,Supervised feature selection,NA
+R_21Bwue7caupkG2t,I have used tidymodels packages a few times,I work in industry,Q5_3,0,Probability calibration (post modeling),NA
+R_21Bwue7caupkG2t,I have used tidymodels packages a few times,I work in industry,Q5_4,20,Probability threshold optimization,NA
+R_21Bwue7caupkG2t,I have used tidymodels packages a few times,I work in industry,Q5_5,0,Spatial analysis models and methods,NA
+R_21Bwue7caupkG2t,I have used tidymodels packages a few times,I work in industry,Q5_6,30,Better serialization tools ,NA
+R_21Bwue7caupkG2t,I have used tidymodels packages a few times,I work in industry,Q5_10,0,H2O.ai support ,NA
+R_21Bwue7caupkG2t,I have used tidymodels packages a few times,I work in industry,Q5_12,50,Other,Mlflow
+R_1IrO3207K82hc1s,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_1,5,Model fairness analysis and metrics,NA
+R_1IrO3207K82hc1s,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_2,50,Supervised feature selection,NA
+R_1IrO3207K82hc1s,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_3,10,Probability calibration (post modeling),NA
+R_1IrO3207K82hc1s,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_4,5,Probability threshold optimization,NA
+R_1IrO3207K82hc1s,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_5,15,Spatial analysis models and methods,NA
+R_1IrO3207K82hc1s,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_6,5,Better serialization tools ,NA
+R_1IrO3207K82hc1s,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_10,10,H2O.ai support ,NA
+R_1IrO3207K82hc1s,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_12,0,Other,NA
+R_1omTJCSLlPQMMUd,I have used tidymodels packages a few times,I work in industry,Q5_1,0,Model fairness analysis and metrics,NA
+R_1omTJCSLlPQMMUd,I have used tidymodels packages a few times,I work in industry,Q5_2,0,Supervised feature selection,NA
+R_1omTJCSLlPQMMUd,I have used tidymodels packages a few times,I work in industry,Q5_3,0,Probability calibration (post modeling),NA
+R_1omTJCSLlPQMMUd,I have used tidymodels packages a few times,I work in industry,Q5_4,30,Probability threshold optimization,NA
+R_1omTJCSLlPQMMUd,I have used tidymodels packages a few times,I work in industry,Q5_5,35,Spatial analysis models and methods,NA
+R_1omTJCSLlPQMMUd,I have used tidymodels packages a few times,I work in industry,Q5_6,25,Better serialization tools ,NA
+R_1omTJCSLlPQMMUd,I have used tidymodels packages a few times,I work in industry,Q5_10,10,H2O.ai support ,NA
+R_1omTJCSLlPQMMUd,I have used tidymodels packages a few times,I work in industry,Q5_12,0,Other,NA
+R_3JhlrChoxbVuLyK,I have used tidymodels packages many times,I work in industry,Q5_1,10,Model fairness analysis and metrics,NA
+R_3JhlrChoxbVuLyK,I have used tidymodels packages many times,I work in industry,Q5_2,25,Supervised feature selection,NA
+R_3JhlrChoxbVuLyK,I have used tidymodels packages many times,I work in industry,Q5_3,20,Probability calibration (post modeling),NA
+R_3JhlrChoxbVuLyK,I have used tidymodels packages many times,I work in industry,Q5_4,10,Probability threshold optimization,NA
+R_3JhlrChoxbVuLyK,I have used tidymodels packages many times,I work in industry,Q5_5,10,Spatial analysis models and methods,NA
+R_3JhlrChoxbVuLyK,I have used tidymodels packages many times,I work in industry,Q5_6,20,Better serialization tools ,NA
+R_3JhlrChoxbVuLyK,I have used tidymodels packages many times,I work in industry,Q5_10,0,H2O.ai support ,NA
+R_3JhlrChoxbVuLyK,I have used tidymodels packages many times,I work in industry,Q5_12,5,Other,Integrated model interpretation
+R_YcpOifTqpM7rSjD,I have used tidymodels packages a few times,I work in industry,Q5_1,41,Model fairness analysis and metrics,NA
+R_YcpOifTqpM7rSjD,I have used tidymodels packages a few times,I work in industry,Q5_2,41,Supervised feature selection,NA
+R_YcpOifTqpM7rSjD,I have used tidymodels packages a few times,I work in industry,Q5_3,5,Probability calibration (post modeling),NA
+R_YcpOifTqpM7rSjD,I have used tidymodels packages a few times,I work in industry,Q5_4,3,Probability threshold optimization,NA
+R_YcpOifTqpM7rSjD,I have used tidymodels packages a few times,I work in industry,Q5_5,2,Spatial analysis models and methods,NA
+R_YcpOifTqpM7rSjD,I have used tidymodels packages a few times,I work in industry,Q5_6,7,Better serialization tools ,NA
+R_YcpOifTqpM7rSjD,I have used tidymodels packages a few times,I work in industry,Q5_10,1,H2O.ai support ,NA
+R_YcpOifTqpM7rSjD,I have used tidymodels packages a few times,I work in industry,Q5_12,0,Other,NA
+R_1Ia5RHoZ2EU8r5U,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_1,0,Model fairness analysis and metrics,NA
+R_1Ia5RHoZ2EU8r5U,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_2,20,Supervised feature selection,NA
+R_1Ia5RHoZ2EU8r5U,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_3,0,Probability calibration (post modeling),NA
+R_1Ia5RHoZ2EU8r5U,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_4,0,Probability threshold optimization,NA
+R_1Ia5RHoZ2EU8r5U,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_5,40,Spatial analysis models and methods,NA
+R_1Ia5RHoZ2EU8r5U,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_6,0,Better serialization tools ,NA
+R_1Ia5RHoZ2EU8r5U,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_10,0,H2O.ai support ,NA
+R_1Ia5RHoZ2EU8r5U,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_12,40,Other,Integration with R-INLA
+R_Z1pqipdC6IiuyvT,I have used tidymodels packages many times,I work in industry,Q5_1,12,Model fairness analysis and metrics,NA
+R_Z1pqipdC6IiuyvT,I have used tidymodels packages many times,I work in industry,Q5_2,12,Supervised feature selection,NA
+R_Z1pqipdC6IiuyvT,I have used tidymodels packages many times,I work in industry,Q5_3,12,Probability calibration (post modeling),NA
+R_Z1pqipdC6IiuyvT,I have used tidymodels packages many times,I work in industry,Q5_4,12,Probability threshold optimization,NA
+R_Z1pqipdC6IiuyvT,I have used tidymodels packages many times,I work in industry,Q5_5,12,Spatial analysis models and methods,NA
+R_Z1pqipdC6IiuyvT,I have used tidymodels packages many times,I work in industry,Q5_6,12,Better serialization tools ,NA
+R_Z1pqipdC6IiuyvT,I have used tidymodels packages many times,I work in industry,Q5_10,15,H2O.ai support ,NA
+R_Z1pqipdC6IiuyvT,I have used tidymodels packages many times,I work in industry,Q5_12,13,Other,deep learning using tidymodels
+R_2VyWApade4x8ZuT,I have used tidymodels packages a few times,I am a hobbyist,Q5_1,30,Model fairness analysis and metrics,NA
+R_2VyWApade4x8ZuT,I have used tidymodels packages a few times,I am a hobbyist,Q5_2,30,Supervised feature selection,NA
+R_2VyWApade4x8ZuT,I have used tidymodels packages a few times,I am a hobbyist,Q5_3,10,Probability calibration (post modeling),NA
+R_2VyWApade4x8ZuT,I have used tidymodels packages a few times,I am a hobbyist,Q5_4,10,Probability threshold optimization,NA
+R_2VyWApade4x8ZuT,I have used tidymodels packages a few times,I am a hobbyist,Q5_5,0,Spatial analysis models and methods,NA
+R_2VyWApade4x8ZuT,I have used tidymodels packages a few times,I am a hobbyist,Q5_6,0,Better serialization tools ,NA
+R_2VyWApade4x8ZuT,I have used tidymodels packages a few times,I am a hobbyist,Q5_10,20,H2O.ai support ,NA
+R_2VyWApade4x8ZuT,I have used tidymodels packages a few times,I am a hobbyist,Q5_12,0,Other,NA
+R_BRpCRl1fyn5eGZ3,I have used tidymodels packages a few times,I work in industry,Q5_1,10,Model fairness analysis and metrics,NA
+R_BRpCRl1fyn5eGZ3,I have used tidymodels packages a few times,I work in industry,Q5_2,20,Supervised feature selection,NA
+R_BRpCRl1fyn5eGZ3,I have used tidymodels packages a few times,I work in industry,Q5_3,20,Probability calibration (post modeling),NA
+R_BRpCRl1fyn5eGZ3,I have used tidymodels packages a few times,I work in industry,Q5_4,10,Probability threshold optimization,NA
+R_BRpCRl1fyn5eGZ3,I have used tidymodels packages a few times,I work in industry,Q5_5,30,Spatial analysis models and methods,NA
+R_BRpCRl1fyn5eGZ3,I have used tidymodels packages a few times,I work in industry,Q5_6,10,Better serialization tools ,NA
+R_BRpCRl1fyn5eGZ3,I have used tidymodels packages a few times,I work in industry,Q5_10,0,H2O.ai support ,NA
+R_BRpCRl1fyn5eGZ3,I have used tidymodels packages a few times,I work in industry,Q5_12,0,Other,NA
+R_3EfGCMDl266atgr,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_1,0,Model fairness analysis and metrics,NA
+R_3EfGCMDl266atgr,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_2,25,Supervised feature selection,NA
+R_3EfGCMDl266atgr,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_3,0,Probability calibration (post modeling),NA
+R_3EfGCMDl266atgr,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_4,0,Probability threshold optimization,NA
+R_3EfGCMDl266atgr,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_5,75,Spatial analysis models and methods,NA
+R_3EfGCMDl266atgr,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_6,0,Better serialization tools ,NA
+R_3EfGCMDl266atgr,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_10,0,H2O.ai support ,NA
+R_3EfGCMDl266atgr,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_12,0,Other,NA
+R_voz9PVIBLV1WQtX,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_1,60,Model fairness analysis and metrics,NA
+R_voz9PVIBLV1WQtX,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_2,0,Supervised feature selection,NA
+R_voz9PVIBLV1WQtX,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_3,20,Probability calibration (post modeling),NA
+R_voz9PVIBLV1WQtX,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_4,0,Probability threshold optimization,NA
+R_voz9PVIBLV1WQtX,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_5,0,Spatial analysis models and methods,NA
+R_voz9PVIBLV1WQtX,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_6,20,Better serialization tools ,NA
+R_voz9PVIBLV1WQtX,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_10,0,H2O.ai support ,NA
+R_voz9PVIBLV1WQtX,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_12,0,Other,NA
+R_8bGdVLcJbiPX1tf,I have used tidymodels packages many times,I work in industry,Q5_1,15,Model fairness analysis and metrics,NA
+R_8bGdVLcJbiPX1tf,I have used tidymodels packages many times,I work in industry,Q5_2,15,Supervised feature selection,NA
+R_8bGdVLcJbiPX1tf,I have used tidymodels packages many times,I work in industry,Q5_3,8,Probability calibration (post modeling),NA
+R_8bGdVLcJbiPX1tf,I have used tidymodels packages many times,I work in industry,Q5_4,10,Probability threshold optimization,NA
+R_8bGdVLcJbiPX1tf,I have used tidymodels packages many times,I work in industry,Q5_5,22,Spatial analysis models and methods,NA
+R_8bGdVLcJbiPX1tf,I have used tidymodels packages many times,I work in industry,Q5_6,5,Better serialization tools ,NA
+R_8bGdVLcJbiPX1tf,I have used tidymodels packages many times,I work in industry,Q5_10,25,H2O.ai support ,NA
+R_8bGdVLcJbiPX1tf,I have used tidymodels packages many times,I work in industry,Q5_12,0,Other,NA
+R_1MRn6s5qgxCt5lk,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_1,35,Model fairness analysis and metrics,NA
+R_1MRn6s5qgxCt5lk,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_2,20,Supervised feature selection,NA
+R_1MRn6s5qgxCt5lk,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_3,0,Probability calibration (post modeling),NA
+R_1MRn6s5qgxCt5lk,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_4,10,Probability threshold optimization,NA
+R_1MRn6s5qgxCt5lk,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_5,0,Spatial analysis models and methods,NA
+R_1MRn6s5qgxCt5lk,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_6,20,Better serialization tools ,NA
+R_1MRn6s5qgxCt5lk,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_10,15,H2O.ai support ,NA
+R_1MRn6s5qgxCt5lk,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_12,0,Other,NA
+R_ub7cGd6ZgDomuqZ,I have used tidymodels packages many times,I am a student,Q5_1,0,Model fairness analysis and metrics,NA
+R_ub7cGd6ZgDomuqZ,I have used tidymodels packages many times,I am a student,Q5_2,30,Supervised feature selection,NA
+R_ub7cGd6ZgDomuqZ,I have used tidymodels packages many times,I am a student,Q5_3,0,Probability calibration (post modeling),NA
+R_ub7cGd6ZgDomuqZ,I have used tidymodels packages many times,I am a student,Q5_4,50,Probability threshold optimization,NA
+R_ub7cGd6ZgDomuqZ,I have used tidymodels packages many times,I am a student,Q5_5,0,Spatial analysis models and methods,NA
+R_ub7cGd6ZgDomuqZ,I have used tidymodels packages many times,I am a student,Q5_6,20,Better serialization tools ,NA
+R_ub7cGd6ZgDomuqZ,I have used tidymodels packages many times,I am a student,Q5_10,0,H2O.ai support ,NA
+R_ub7cGd6ZgDomuqZ,I have used tidymodels packages many times,I am a student,Q5_12,0,Other,NA
+R_11ZuQR1YU9lIv4N,I have used tidymodels packages a few times,I work in industry,Q5_1,10,Model fairness analysis and metrics,NA
+R_11ZuQR1YU9lIv4N,I have used tidymodels packages a few times,I work in industry,Q5_2,15,Supervised feature selection,NA
+R_11ZuQR1YU9lIv4N,I have used tidymodels packages a few times,I work in industry,Q5_3,10,Probability calibration (post modeling),NA
+R_11ZuQR1YU9lIv4N,I have used tidymodels packages a few times,I work in industry,Q5_4,20,Probability threshold optimization,NA
+R_11ZuQR1YU9lIv4N,I have used tidymodels packages a few times,I work in industry,Q5_5,20,Spatial analysis models and methods,NA
+R_11ZuQR1YU9lIv4N,I have used tidymodels packages a few times,I work in industry,Q5_6,25,Better serialization tools ,NA
+R_11ZuQR1YU9lIv4N,I have used tidymodels packages a few times,I work in industry,Q5_10,0,H2O.ai support ,NA
+R_11ZuQR1YU9lIv4N,I have used tidymodels packages a few times,I work in industry,Q5_12,0,Other,NA
+R_1P5E02VXMxcu0Kx,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_1,5,Model fairness analysis and metrics,NA
+R_1P5E02VXMxcu0Kx,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_2,30,Supervised feature selection,NA
+R_1P5E02VXMxcu0Kx,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_3,10,Probability calibration (post modeling),NA
+R_1P5E02VXMxcu0Kx,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_4,5,Probability threshold optimization,NA
+R_1P5E02VXMxcu0Kx,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_5,10,Spatial analysis models and methods,NA
+R_1P5E02VXMxcu0Kx,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_6,40,Better serialization tools ,NA
+R_1P5E02VXMxcu0Kx,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_10,0,H2O.ai support ,NA
+R_1P5E02VXMxcu0Kx,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_12,0,Other,NA
+R_1Eg3vxSdtGRGIsP,I have used tidymodels packages many times,I work in industry,Q5_1,20,Model fairness analysis and metrics,NA
+R_1Eg3vxSdtGRGIsP,I have used tidymodels packages many times,I work in industry,Q5_2,30,Supervised feature selection,NA
+R_1Eg3vxSdtGRGIsP,I have used tidymodels packages many times,I work in industry,Q5_3,20,Probability calibration (post modeling),NA
+R_1Eg3vxSdtGRGIsP,I have used tidymodels packages many times,I work in industry,Q5_4,0,Probability threshold optimization,NA
+R_1Eg3vxSdtGRGIsP,I have used tidymodels packages many times,I work in industry,Q5_5,0,Spatial analysis models and methods,NA
+R_1Eg3vxSdtGRGIsP,I have used tidymodels packages many times,I work in industry,Q5_6,0,Better serialization tools ,NA
+R_1Eg3vxSdtGRGIsP,I have used tidymodels packages many times,I work in industry,Q5_10,30,H2O.ai support ,NA
+R_1Eg3vxSdtGRGIsP,I have used tidymodels packages many times,I work in industry,Q5_12,0,Other,NA
+R_3Mnx5wSGah1Jmhw,I have used tidymodels packages many times,I work in industry,Q5_1,10,Model fairness analysis and metrics,NA
+R_3Mnx5wSGah1Jmhw,I have used tidymodels packages many times,I work in industry,Q5_2,15,Supervised feature selection,NA
+R_3Mnx5wSGah1Jmhw,I have used tidymodels packages many times,I work in industry,Q5_3,20,Probability calibration (post modeling),NA
+R_3Mnx5wSGah1Jmhw,I have used tidymodels packages many times,I work in industry,Q5_4,25,Probability threshold optimization,NA
+R_3Mnx5wSGah1Jmhw,I have used tidymodels packages many times,I work in industry,Q5_5,5,Spatial analysis models and methods,NA
+R_3Mnx5wSGah1Jmhw,I have used tidymodels packages many times,I work in industry,Q5_6,10,Better serialization tools ,NA
+R_3Mnx5wSGah1Jmhw,I have used tidymodels packages many times,I work in industry,Q5_10,15,H2O.ai support ,NA
+R_3Mnx5wSGah1Jmhw,I have used tidymodels packages many times,I work in industry,Q5_12,0,Other,NA
+R_3p2QKJdyDcB9jWE,I have used tidymodels packages a few times,I am a student,Q5_1,30,Model fairness analysis and metrics,NA
+R_3p2QKJdyDcB9jWE,I have used tidymodels packages a few times,I am a student,Q5_2,20,Supervised feature selection,NA
+R_3p2QKJdyDcB9jWE,I have used tidymodels packages a few times,I am a student,Q5_3,0,Probability calibration (post modeling),NA
+R_3p2QKJdyDcB9jWE,I have used tidymodels packages a few times,I am a student,Q5_4,0,Probability threshold optimization,NA
+R_3p2QKJdyDcB9jWE,I have used tidymodels packages a few times,I am a student,Q5_5,10,Spatial analysis models and methods,NA
+R_3p2QKJdyDcB9jWE,I have used tidymodels packages a few times,I am a student,Q5_6,20,Better serialization tools ,NA
+R_3p2QKJdyDcB9jWE,I have used tidymodels packages a few times,I am a student,Q5_10,20,H2O.ai support ,NA
+R_3p2QKJdyDcB9jWE,I have used tidymodels packages a few times,I am a student,Q5_12,0,Other,NA
+R_1Kl5kUPylZPXtWT,I have used tidymodels packages many times,I work in industry,Q5_1,0,Model fairness analysis and metrics,NA
+R_1Kl5kUPylZPXtWT,I have used tidymodels packages many times,I work in industry,Q5_2,0,Supervised feature selection,NA
+R_1Kl5kUPylZPXtWT,I have used tidymodels packages many times,I work in industry,Q5_3,0,Probability calibration (post modeling),NA
+R_1Kl5kUPylZPXtWT,I have used tidymodels packages many times,I work in industry,Q5_4,0,Probability threshold optimization,NA
+R_1Kl5kUPylZPXtWT,I have used tidymodels packages many times,I work in industry,Q5_5,0,Spatial analysis models and methods,NA
+R_1Kl5kUPylZPXtWT,I have used tidymodels packages many times,I work in industry,Q5_6,100,Better serialization tools ,NA
+R_1Kl5kUPylZPXtWT,I have used tidymodels packages many times,I work in industry,Q5_10,0,H2O.ai support ,NA
+R_1Kl5kUPylZPXtWT,I have used tidymodels packages many times,I work in industry,Q5_12,0,Other,NA
+R_UFN8YmCIWlFwQ93,I have used tidymodels packages a few times,I work in industry,Q5_1,0,Model fairness analysis and metrics,NA
+R_UFN8YmCIWlFwQ93,I have used tidymodels packages a few times,I work in industry,Q5_2,10,Supervised feature selection,NA
+R_UFN8YmCIWlFwQ93,I have used tidymodels packages a few times,I work in industry,Q5_3,20,Probability calibration (post modeling),NA
+R_UFN8YmCIWlFwQ93,I have used tidymodels packages a few times,I work in industry,Q5_4,20,Probability threshold optimization,NA
+R_UFN8YmCIWlFwQ93,I have used tidymodels packages a few times,I work in industry,Q5_5,0,Spatial analysis models and methods,NA
+R_UFN8YmCIWlFwQ93,I have used tidymodels packages a few times,I work in industry,Q5_6,50,Better serialization tools ,NA
+R_UFN8YmCIWlFwQ93,I have used tidymodels packages a few times,I work in industry,Q5_10,0,H2O.ai support ,NA
+R_UFN8YmCIWlFwQ93,I have used tidymodels packages a few times,I work in industry,Q5_12,0,Other,NA
+R_1cY7n7weh677lrF,I have used tidymodels packages many times,I work in industry,Q5_1,10,Model fairness analysis and metrics,NA
+R_1cY7n7weh677lrF,I have used tidymodels packages many times,I work in industry,Q5_2,25,Supervised feature selection,NA
+R_1cY7n7weh677lrF,I have used tidymodels packages many times,I work in industry,Q5_3,20,Probability calibration (post modeling),NA
+R_1cY7n7weh677lrF,I have used tidymodels packages many times,I work in industry,Q5_4,20,Probability threshold optimization,NA
+R_1cY7n7weh677lrF,I have used tidymodels packages many times,I work in industry,Q5_5,0,Spatial analysis models and methods,NA
+R_1cY7n7weh677lrF,I have used tidymodels packages many times,I work in industry,Q5_6,15,Better serialization tools ,NA
+R_1cY7n7weh677lrF,I have used tidymodels packages many times,I work in industry,Q5_10,10,H2O.ai support ,NA
+R_1cY7n7weh677lrF,I have used tidymodels packages many times,I work in industry,Q5_12,0,Other,NA
+R_3EMQOUmRZTebdDk,I have used tidymodels packages many times,I work in industry,Q5_1,0,Model fairness analysis and metrics,NA
+R_3EMQOUmRZTebdDk,I have used tidymodels packages many times,I work in industry,Q5_2,20,Supervised feature selection,NA
+R_3EMQOUmRZTebdDk,I have used tidymodels packages many times,I work in industry,Q5_3,0,Probability calibration (post modeling),NA
+R_3EMQOUmRZTebdDk,I have used tidymodels packages many times,I work in industry,Q5_4,40,Probability threshold optimization,NA
+R_3EMQOUmRZTebdDk,I have used tidymodels packages many times,I work in industry,Q5_5,0,Spatial analysis models and methods,NA
+R_3EMQOUmRZTebdDk,I have used tidymodels packages many times,I work in industry,Q5_6,40,Better serialization tools ,NA
+R_3EMQOUmRZTebdDk,I have used tidymodels packages many times,I work in industry,Q5_10,0,H2O.ai support ,NA
+R_3EMQOUmRZTebdDk,I have used tidymodels packages many times,I work in industry,Q5_12,0,Other,NA
+R_5pc3sIXdhEVspaN,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_1,10,Model fairness analysis and metrics,NA
+R_5pc3sIXdhEVspaN,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_2,20,Supervised feature selection,NA
+R_5pc3sIXdhEVspaN,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_3,10,Probability calibration (post modeling),NA
+R_5pc3sIXdhEVspaN,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_4,10,Probability threshold optimization,NA
+R_5pc3sIXdhEVspaN,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_5,10,Spatial analysis models and methods,NA
+R_5pc3sIXdhEVspaN,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_6,20,Better serialization tools ,NA
+R_5pc3sIXdhEVspaN,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_10,10,H2O.ai support ,NA
+R_5pc3sIXdhEVspaN,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_12,10,Other,learning ensemble with lasso
+R_1IcLEnityXz8q6G,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_1,50,Model fairness analysis and metrics,NA
+R_1IcLEnityXz8q6G,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_2,10,Supervised feature selection,NA
+R_1IcLEnityXz8q6G,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_3,5,Probability calibration (post modeling),NA
+R_1IcLEnityXz8q6G,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_4,25,Probability threshold optimization,NA
+R_1IcLEnityXz8q6G,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_5,0,Spatial analysis models and methods,NA
+R_1IcLEnityXz8q6G,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_6,10,Better serialization tools ,NA
+R_1IcLEnityXz8q6G,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_10,0,H2O.ai support ,NA
+R_1IcLEnityXz8q6G,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_12,0,Other,NA
+R_3qaqsvvZMhBKPn8,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_1,33,Model fairness analysis and metrics,NA
+R_3qaqsvvZMhBKPn8,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_2,34,Supervised feature selection,NA
+R_3qaqsvvZMhBKPn8,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_3,0,Probability calibration (post modeling),NA
+R_3qaqsvvZMhBKPn8,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_4,0,Probability threshold optimization,NA
+R_3qaqsvvZMhBKPn8,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_5,0,Spatial analysis models and methods,NA
+R_3qaqsvvZMhBKPn8,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_6,33,Better serialization tools ,NA
+R_3qaqsvvZMhBKPn8,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_10,0,H2O.ai support ,NA
+R_3qaqsvvZMhBKPn8,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_12,0,Other,NA
+R_1dcQIPBD4cVNSWd,I have used tidymodels packages a few times,I work in industry,Q5_1,0,Model fairness analysis and metrics,NA
+R_1dcQIPBD4cVNSWd,I have used tidymodels packages a few times,I work in industry,Q5_2,30,Supervised feature selection,NA
+R_1dcQIPBD4cVNSWd,I have used tidymodels packages a few times,I work in industry,Q5_3,0,Probability calibration (post modeling),NA
+R_1dcQIPBD4cVNSWd,I have used tidymodels packages a few times,I work in industry,Q5_4,0,Probability threshold optimization,NA
+R_1dcQIPBD4cVNSWd,I have used tidymodels packages a few times,I work in industry,Q5_5,0,Spatial analysis models and methods,NA
+R_1dcQIPBD4cVNSWd,I have used tidymodels packages a few times,I work in industry,Q5_6,50,Better serialization tools ,NA
+R_1dcQIPBD4cVNSWd,I have used tidymodels packages a few times,I work in industry,Q5_10,20,H2O.ai support ,NA
+R_1dcQIPBD4cVNSWd,I have used tidymodels packages a few times,I work in industry,Q5_12,0,Other,NA
+R_23awDlg0pz0pYOE,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_1,0,Model fairness analysis and metrics,NA
+R_23awDlg0pz0pYOE,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_2,80,Supervised feature selection,NA
+R_23awDlg0pz0pYOE,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_3,0,Probability calibration (post modeling),NA
+R_23awDlg0pz0pYOE,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_4,20,Probability threshold optimization,NA
+R_23awDlg0pz0pYOE,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_5,0,Spatial analysis models and methods,NA
+R_23awDlg0pz0pYOE,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_6,0,Better serialization tools ,NA
+R_23awDlg0pz0pYOE,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_10,0,H2O.ai support ,NA
+R_23awDlg0pz0pYOE,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_12,0,Other,NA
+R_2Pb2pXLrL0MU9Fc,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_1,0,Model fairness analysis and metrics,NA
+R_2Pb2pXLrL0MU9Fc,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_2,50,Supervised feature selection,NA
+R_2Pb2pXLrL0MU9Fc,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_3,25,Probability calibration (post modeling),NA
+R_2Pb2pXLrL0MU9Fc,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_4,0,Probability threshold optimization,NA
+R_2Pb2pXLrL0MU9Fc,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_5,0,Spatial analysis models and methods,NA
+R_2Pb2pXLrL0MU9Fc,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_6,25,Better serialization tools ,NA
+R_2Pb2pXLrL0MU9Fc,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_10,0,H2O.ai support ,NA
+R_2Pb2pXLrL0MU9Fc,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_12,0,Other,NA
+R_21vqcKaP0EHU41q,I have used tidymodels packages a few times,I work in industry,Q5_1,40,Model fairness analysis and metrics,NA
+R_21vqcKaP0EHU41q,I have used tidymodels packages a few times,I work in industry,Q5_2,20,Supervised feature selection,NA
+R_21vqcKaP0EHU41q,I have used tidymodels packages a few times,I work in industry,Q5_3,20,Probability calibration (post modeling),NA
+R_21vqcKaP0EHU41q,I have used tidymodels packages a few times,I work in industry,Q5_4,10,Probability threshold optimization,NA
+R_21vqcKaP0EHU41q,I have used tidymodels packages a few times,I work in industry,Q5_5,0,Spatial analysis models and methods,NA
+R_21vqcKaP0EHU41q,I have used tidymodels packages a few times,I work in industry,Q5_6,10,Better serialization tools ,NA
+R_21vqcKaP0EHU41q,I have used tidymodels packages a few times,I work in industry,Q5_10,0,H2O.ai support ,NA
+R_21vqcKaP0EHU41q,I have used tidymodels packages a few times,I work in industry,Q5_12,0,Other,NA
+R_2CuXWrBxXcu5OIW,I have used tidymodels packages many times,I work in industry,Q5_1,5,Model fairness analysis and metrics,NA
+R_2CuXWrBxXcu5OIW,I have used tidymodels packages many times,I work in industry,Q5_2,30,Supervised feature selection,NA
+R_2CuXWrBxXcu5OIW,I have used tidymodels packages many times,I work in industry,Q5_3,10,Probability calibration (post modeling),NA
+R_2CuXWrBxXcu5OIW,I have used tidymodels packages many times,I work in industry,Q5_4,5,Probability threshold optimization,NA
+R_2CuXWrBxXcu5OIW,I have used tidymodels packages many times,I work in industry,Q5_5,45,Spatial analysis models and methods,NA
+R_2CuXWrBxXcu5OIW,I have used tidymodels packages many times,I work in industry,Q5_6,0,Better serialization tools ,NA
+R_2CuXWrBxXcu5OIW,I have used tidymodels packages many times,I work in industry,Q5_10,5,H2O.ai support ,NA
+R_2CuXWrBxXcu5OIW,I have used tidymodels packages many times,I work in industry,Q5_12,0,Other,NA
+R_2zZ6Dw5jG1T8bqe,I have used tidymodels packages many times,I work in industry,Q5_1,20,Model fairness analysis and metrics,NA
+R_2zZ6Dw5jG1T8bqe,I have used tidymodels packages many times,I work in industry,Q5_2,5,Supervised feature selection,NA
+R_2zZ6Dw5jG1T8bqe,I have used tidymodels packages many times,I work in industry,Q5_3,30,Probability calibration (post modeling),NA
+R_2zZ6Dw5jG1T8bqe,I have used tidymodels packages many times,I work in industry,Q5_4,30,Probability threshold optimization,NA
+R_2zZ6Dw5jG1T8bqe,I have used tidymodels packages many times,I work in industry,Q5_5,5,Spatial analysis models and methods,NA
+R_2zZ6Dw5jG1T8bqe,I have used tidymodels packages many times,I work in industry,Q5_6,10,Better serialization tools ,NA
+R_2zZ6Dw5jG1T8bqe,I have used tidymodels packages many times,I work in industry,Q5_10,0,H2O.ai support ,NA
+R_2zZ6Dw5jG1T8bqe,I have used tidymodels packages many times,I work in industry,Q5_12,0,Other,NA
+R_1nO6KDNUa2ju4zF,I have used tidymodels packages many times,I work in industry,Q5_1,5,Model fairness analysis and metrics,NA
+R_1nO6KDNUa2ju4zF,I have used tidymodels packages many times,I work in industry,Q5_2,20,Supervised feature selection,NA
+R_1nO6KDNUa2ju4zF,I have used tidymodels packages many times,I work in industry,Q5_3,15,Probability calibration (post modeling),NA
+R_1nO6KDNUa2ju4zF,I have used tidymodels packages many times,I work in industry,Q5_4,5,Probability threshold optimization,NA
+R_1nO6KDNUa2ju4zF,I have used tidymodels packages many times,I work in industry,Q5_5,20,Spatial analysis models and methods,NA
+R_1nO6KDNUa2ju4zF,I have used tidymodels packages many times,I work in industry,Q5_6,20,Better serialization tools ,NA
+R_1nO6KDNUa2ju4zF,I have used tidymodels packages many times,I work in industry,Q5_10,15,H2O.ai support ,NA
+R_1nO6KDNUa2ju4zF,I have used tidymodels packages many times,I work in industry,Q5_12,0,Other,NA
+R_sOkUV7Vmv8rhedH,I have used tidymodels packages a few times,I am a hobbyist,Q5_1,10,Model fairness analysis and metrics,NA
+R_sOkUV7Vmv8rhedH,I have used tidymodels packages a few times,I am a hobbyist,Q5_2,10,Supervised feature selection,NA
+R_sOkUV7Vmv8rhedH,I have used tidymodels packages a few times,I am a hobbyist,Q5_3,20,Probability calibration (post modeling),NA
+R_sOkUV7Vmv8rhedH,I have used tidymodels packages a few times,I am a hobbyist,Q5_4,10,Probability threshold optimization,NA
+R_sOkUV7Vmv8rhedH,I have used tidymodels packages a few times,I am a hobbyist,Q5_5,10,Spatial analysis models and methods,NA
+R_sOkUV7Vmv8rhedH,I have used tidymodels packages a few times,I am a hobbyist,Q5_6,20,Better serialization tools ,NA
+R_sOkUV7Vmv8rhedH,I have used tidymodels packages a few times,I am a hobbyist,Q5_10,10,H2O.ai support ,NA
+R_sOkUV7Vmv8rhedH,I have used tidymodels packages a few times,I am a hobbyist,Q5_12,10,Other,NA
+R_1Ft6DYMiE2xnI87,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_1,0,Model fairness analysis and metrics,NA
+R_1Ft6DYMiE2xnI87,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_2,40,Supervised feature selection,NA
+R_1Ft6DYMiE2xnI87,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_3,0,Probability calibration (post modeling),NA
+R_1Ft6DYMiE2xnI87,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_4,20,Probability threshold optimization,NA
+R_1Ft6DYMiE2xnI87,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_5,0,Spatial analysis models and methods,NA
+R_1Ft6DYMiE2xnI87,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_6,25,Better serialization tools ,NA
+R_1Ft6DYMiE2xnI87,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_10,15,H2O.ai support ,NA
+R_1Ft6DYMiE2xnI87,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_12,0,Other,NA
+R_27HbtkXAwRxFuOs,I have used tidymodels packages a few times,I am a student,Q5_1,10,Model fairness analysis and metrics,NA
+R_27HbtkXAwRxFuOs,I have used tidymodels packages a few times,I am a student,Q5_2,10,Supervised feature selection,NA
+R_27HbtkXAwRxFuOs,I have used tidymodels packages a few times,I am a student,Q5_3,0,Probability calibration (post modeling),NA
+R_27HbtkXAwRxFuOs,I have used tidymodels packages a few times,I am a student,Q5_4,0,Probability threshold optimization,NA
+R_27HbtkXAwRxFuOs,I have used tidymodels packages a few times,I am a student,Q5_5,20,Spatial analysis models and methods,NA
+R_27HbtkXAwRxFuOs,I have used tidymodels packages a few times,I am a student,Q5_6,0,Better serialization tools ,NA
+R_27HbtkXAwRxFuOs,I have used tidymodels packages a few times,I am a student,Q5_10,60,H2O.ai support ,NA
+R_27HbtkXAwRxFuOs,I have used tidymodels packages a few times,I am a student,Q5_12,0,Other,NA
+R_umQJtNQ7NSev4Ln,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_1,10,Model fairness analysis and metrics,NA
+R_umQJtNQ7NSev4Ln,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_2,50,Supervised feature selection,NA
+R_umQJtNQ7NSev4Ln,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_3,0,Probability calibration (post modeling),NA
+R_umQJtNQ7NSev4Ln,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_4,0,Probability threshold optimization,NA
+R_umQJtNQ7NSev4Ln,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_5,30,Spatial analysis models and methods,NA
+R_umQJtNQ7NSev4Ln,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_6,0,Better serialization tools ,NA
+R_umQJtNQ7NSev4Ln,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_10,10,H2O.ai support ,NA
+R_umQJtNQ7NSev4Ln,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_12,0,Other,NA
+R_bQJfmFAS3zhGW1H,I have never used tidymodels,I am a student,Q5_1,0,Model fairness analysis and metrics,NA
+R_bQJfmFAS3zhGW1H,I have never used tidymodels,I am a student,Q5_2,0,Supervised feature selection,NA
+R_bQJfmFAS3zhGW1H,I have never used tidymodels,I am a student,Q5_3,0,Probability calibration (post modeling),NA
+R_bQJfmFAS3zhGW1H,I have never used tidymodels,I am a student,Q5_4,0,Probability threshold optimization,NA
+R_bQJfmFAS3zhGW1H,I have never used tidymodels,I am a student,Q5_5,0,Spatial analysis models and methods,NA
+R_bQJfmFAS3zhGW1H,I have never used tidymodels,I am a student,Q5_6,0,Better serialization tools ,NA
+R_bQJfmFAS3zhGW1H,I have never used tidymodels,I am a student,Q5_10,0,H2O.ai support ,NA
+R_bQJfmFAS3zhGW1H,I have never used tidymodels,I am a student,Q5_12,100,Other,a new simple beginners series
+R_1EaHAjc2cYhiTxv,I have never used tidymodels,I am a hobbyist,Q5_1,0,Model fairness analysis and metrics,NA
+R_1EaHAjc2cYhiTxv,I have never used tidymodels,I am a hobbyist,Q5_2,0,Supervised feature selection,NA
+R_1EaHAjc2cYhiTxv,I have never used tidymodels,I am a hobbyist,Q5_3,0,Probability calibration (post modeling),NA
+R_1EaHAjc2cYhiTxv,I have never used tidymodels,I am a hobbyist,Q5_4,0,Probability threshold optimization,NA
+R_1EaHAjc2cYhiTxv,I have never used tidymodels,I am a hobbyist,Q5_5,0,Spatial analysis models and methods,NA
+R_1EaHAjc2cYhiTxv,I have never used tidymodels,I am a hobbyist,Q5_6,0,Better serialization tools ,NA
+R_1EaHAjc2cYhiTxv,I have never used tidymodels,I am a hobbyist,Q5_10,0,H2O.ai support ,NA
+R_1EaHAjc2cYhiTxv,I have never used tidymodels,I am a hobbyist,Q5_12,100,Other,An absolute beginners series to ML
+R_bJEiKdwdFO1jCVj,I have used tidymodels packages many times,I work in industry,Q5_1,10,Model fairness analysis and metrics,NA
+R_bJEiKdwdFO1jCVj,I have used tidymodels packages many times,I work in industry,Q5_2,0,Supervised feature selection,NA
+R_bJEiKdwdFO1jCVj,I have used tidymodels packages many times,I work in industry,Q5_3,0,Probability calibration (post modeling),NA
+R_bJEiKdwdFO1jCVj,I have used tidymodels packages many times,I work in industry,Q5_4,10,Probability threshold optimization,NA
+R_bJEiKdwdFO1jCVj,I have used tidymodels packages many times,I work in industry,Q5_5,0,Spatial analysis models and methods,NA
+R_bJEiKdwdFO1jCVj,I have used tidymodels packages many times,I work in industry,Q5_6,0,Better serialization tools ,NA
+R_bJEiKdwdFO1jCVj,I have used tidymodels packages many times,I work in industry,Q5_10,0,H2O.ai support ,NA
+R_bJEiKdwdFO1jCVj,I have used tidymodels packages many times,I work in industry,Q5_12,80,Other,precision on cross validation
+R_WCN6vPGMjsY3I7D,I have never used tidymodels,"I am an academic, professor, and/or researcher",Q5_1,0,Model fairness analysis and metrics,NA
+R_WCN6vPGMjsY3I7D,I have never used tidymodels,"I am an academic, professor, and/or researcher",Q5_2,0,Supervised feature selection,NA
+R_WCN6vPGMjsY3I7D,I have never used tidymodels,"I am an academic, professor, and/or researcher",Q5_3,0,Probability calibration (post modeling),NA
+R_WCN6vPGMjsY3I7D,I have never used tidymodels,"I am an academic, professor, and/or researcher",Q5_4,0,Probability threshold optimization,NA
+R_WCN6vPGMjsY3I7D,I have never used tidymodels,"I am an academic, professor, and/or researcher",Q5_5,0,Spatial analysis models and methods,NA
+R_WCN6vPGMjsY3I7D,I have never used tidymodels,"I am an academic, professor, and/or researcher",Q5_6,0,Better serialization tools ,NA
+R_WCN6vPGMjsY3I7D,I have never used tidymodels,"I am an academic, professor, and/or researcher",Q5_10,0,H2O.ai support ,NA
+R_WCN6vPGMjsY3I7D,I have never used tidymodels,"I am an academic, professor, and/or researcher",Q5_12,100,Other,Unknown
+R_ZC5jHyxvhdlJt85,I have used tidymodels packages many times,I work in industry,Q5_1,20,Model fairness analysis and metrics,NA
+R_ZC5jHyxvhdlJt85,I have used tidymodels packages many times,I work in industry,Q5_2,25,Supervised feature selection,NA
+R_ZC5jHyxvhdlJt85,I have used tidymodels packages many times,I work in industry,Q5_3,10,Probability calibration (post modeling),NA
+R_ZC5jHyxvhdlJt85,I have used tidymodels packages many times,I work in industry,Q5_4,0,Probability threshold optimization,NA
+R_ZC5jHyxvhdlJt85,I have used tidymodels packages many times,I work in industry,Q5_5,0,Spatial analysis models and methods,NA
+R_ZC5jHyxvhdlJt85,I have used tidymodels packages many times,I work in industry,Q5_6,20,Better serialization tools ,NA
+R_ZC5jHyxvhdlJt85,I have used tidymodels packages many times,I work in industry,Q5_10,25,H2O.ai support ,NA
+R_ZC5jHyxvhdlJt85,I have used tidymodels packages many times,I work in industry,Q5_12,0,Other,NA
+R_2zMat9sUw9w4mqG,I have used tidymodels packages a few times,I am a student,Q5_1,0,Model fairness analysis and metrics,NA
+R_2zMat9sUw9w4mqG,I have used tidymodels packages a few times,I am a student,Q5_2,5,Supervised feature selection,NA
+R_2zMat9sUw9w4mqG,I have used tidymodels packages a few times,I am a student,Q5_3,10,Probability calibration (post modeling),NA
+R_2zMat9sUw9w4mqG,I have used tidymodels packages a few times,I am a student,Q5_4,5,Probability threshold optimization,NA
+R_2zMat9sUw9w4mqG,I have used tidymodels packages a few times,I am a student,Q5_5,20,Spatial analysis models and methods,NA
+R_2zMat9sUw9w4mqG,I have used tidymodels packages a few times,I am a student,Q5_6,15,Better serialization tools ,NA
+R_2zMat9sUw9w4mqG,I have used tidymodels packages a few times,I am a student,Q5_10,40,H2O.ai support ,NA
+R_2zMat9sUw9w4mqG,I have used tidymodels packages a few times,I am a student,Q5_12,5,Other,Feature importance
+R_1yV3pozk4Qh7HCV,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_1,15,Model fairness analysis and metrics,NA
+R_1yV3pozk4Qh7HCV,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_2,10,Supervised feature selection,NA
+R_1yV3pozk4Qh7HCV,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_3,25,Probability calibration (post modeling),NA
+R_1yV3pozk4Qh7HCV,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_4,5,Probability threshold optimization,NA
+R_1yV3pozk4Qh7HCV,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_5,5,Spatial analysis models and methods,NA
+R_1yV3pozk4Qh7HCV,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_6,35,Better serialization tools ,NA
+R_1yV3pozk4Qh7HCV,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_10,5,H2O.ai support ,NA
+R_1yV3pozk4Qh7HCV,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_12,0,Other,NA
+R_1P6S0afGLddtRqQ,I have used tidymodels packages a few times,I work in industry,Q5_1,0,Model fairness analysis and metrics,NA
+R_1P6S0afGLddtRqQ,I have used tidymodels packages a few times,I work in industry,Q5_2,0,Supervised feature selection,NA
+R_1P6S0afGLddtRqQ,I have used tidymodels packages a few times,I work in industry,Q5_3,0,Probability calibration (post modeling),NA
+R_1P6S0afGLddtRqQ,I have used tidymodels packages a few times,I work in industry,Q5_4,0,Probability threshold optimization,NA
+R_1P6S0afGLddtRqQ,I have used tidymodels packages a few times,I work in industry,Q5_5,0,Spatial analysis models and methods,NA
+R_1P6S0afGLddtRqQ,I have used tidymodels packages a few times,I work in industry,Q5_6,0,Better serialization tools ,NA
+R_1P6S0afGLddtRqQ,I have used tidymodels packages a few times,I work in industry,Q5_10,0,H2O.ai support ,NA
+R_1P6S0afGLddtRqQ,I have used tidymodels packages a few times,I work in industry,Q5_12,100,Other,Support for mixed effects / hierarchical models
+R_1DAJXjj9jMKt5X8,I have used tidymodels packages many times,I work in industry,Q5_1,25,Model fairness analysis and metrics,NA
+R_1DAJXjj9jMKt5X8,I have used tidymodels packages many times,I work in industry,Q5_2,10,Supervised feature selection,NA
+R_1DAJXjj9jMKt5X8,I have used tidymodels packages many times,I work in industry,Q5_3,30,Probability calibration (post modeling),NA
+R_1DAJXjj9jMKt5X8,I have used tidymodels packages many times,I work in industry,Q5_4,25,Probability threshold optimization,NA
+R_1DAJXjj9jMKt5X8,I have used tidymodels packages many times,I work in industry,Q5_5,10,Spatial analysis models and methods,NA
+R_1DAJXjj9jMKt5X8,I have used tidymodels packages many times,I work in industry,Q5_6,0,Better serialization tools ,NA
+R_1DAJXjj9jMKt5X8,I have used tidymodels packages many times,I work in industry,Q5_10,0,H2O.ai support ,NA
+R_1DAJXjj9jMKt5X8,I have used tidymodels packages many times,I work in industry,Q5_12,0,Other,NA
+R_1hSbpkDSPONnZrv,I have used tidymodels packages many times,I work in industry,Q5_1,0,Model fairness analysis and metrics,NA
+R_1hSbpkDSPONnZrv,I have used tidymodels packages many times,I work in industry,Q5_2,35,Supervised feature selection,NA
+R_1hSbpkDSPONnZrv,I have used tidymodels packages many times,I work in industry,Q5_3,5,Probability calibration (post modeling),NA
+R_1hSbpkDSPONnZrv,I have used tidymodels packages many times,I work in industry,Q5_4,0,Probability threshold optimization,NA
+R_1hSbpkDSPONnZrv,I have used tidymodels packages many times,I work in industry,Q5_5,10,Spatial analysis models and methods,NA
+R_1hSbpkDSPONnZrv,I have used tidymodels packages many times,I work in industry,Q5_6,50,Better serialization tools ,NA
+R_1hSbpkDSPONnZrv,I have used tidymodels packages many times,I work in industry,Q5_10,0,H2O.ai support ,NA
+R_1hSbpkDSPONnZrv,I have used tidymodels packages many times,I work in industry,Q5_12,0,Other,NA
+R_3LbtmaKBE1mUiJS,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_1,10,Model fairness analysis and metrics,NA
+R_3LbtmaKBE1mUiJS,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_2,10,Supervised feature selection,NA
+R_3LbtmaKBE1mUiJS,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_3,10,Probability calibration (post modeling),NA
+R_3LbtmaKBE1mUiJS,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_4,10,Probability threshold optimization,NA
+R_3LbtmaKBE1mUiJS,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_5,0,Spatial analysis models and methods,NA
+R_3LbtmaKBE1mUiJS,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_6,10,Better serialization tools ,NA
+R_3LbtmaKBE1mUiJS,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_10,10,H2O.ai support ,NA
+R_3LbtmaKBE1mUiJS,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_12,40,Other,Model interpretability (e.g. integration with DALEX etc.)
+R_25Bmd5uCYovsvdm,I have used tidymodels packages a few times,I work in industry,Q5_1,20,Model fairness analysis and metrics,NA
+R_25Bmd5uCYovsvdm,I have used tidymodels packages a few times,I work in industry,Q5_2,20,Supervised feature selection,NA
+R_25Bmd5uCYovsvdm,I have used tidymodels packages a few times,I work in industry,Q5_3,0,Probability calibration (post modeling),NA
+R_25Bmd5uCYovsvdm,I have used tidymodels packages a few times,I work in industry,Q5_4,30,Probability threshold optimization,NA
+R_25Bmd5uCYovsvdm,I have used tidymodels packages a few times,I work in industry,Q5_5,0,Spatial analysis models and methods,NA
+R_25Bmd5uCYovsvdm,I have used tidymodels packages a few times,I work in industry,Q5_6,0,Better serialization tools ,NA
+R_25Bmd5uCYovsvdm,I have used tidymodels packages a few times,I work in industry,Q5_10,30,H2O.ai support ,NA
+R_25Bmd5uCYovsvdm,I have used tidymodels packages a few times,I work in industry,Q5_12,0,Other,NA
+R_QcsMkxio9o3UONr,I have used tidymodels packages a few times,I work in industry,Q5_1,0,Model fairness analysis and metrics,NA
+R_QcsMkxio9o3UONr,I have used tidymodels packages a few times,I work in industry,Q5_2,100,Supervised feature selection,NA
+R_QcsMkxio9o3UONr,I have used tidymodels packages a few times,I work in industry,Q5_3,0,Probability calibration (post modeling),NA
+R_QcsMkxio9o3UONr,I have used tidymodels packages a few times,I work in industry,Q5_4,0,Probability threshold optimization,NA
+R_QcsMkxio9o3UONr,I have used tidymodels packages a few times,I work in industry,Q5_5,0,Spatial analysis models and methods,NA
+R_QcsMkxio9o3UONr,I have used tidymodels packages a few times,I work in industry,Q5_6,0,Better serialization tools ,NA
+R_QcsMkxio9o3UONr,I have used tidymodels packages a few times,I work in industry,Q5_10,0,H2O.ai support ,NA
+R_QcsMkxio9o3UONr,I have used tidymodels packages a few times,I work in industry,Q5_12,0,Other,NA
+R_8H5g2xJLrHHDEPv,I have used tidymodels packages many times,I work in industry,Q5_1,0,Model fairness analysis and metrics,NA
+R_8H5g2xJLrHHDEPv,I have used tidymodels packages many times,I work in industry,Q5_2,5,Supervised feature selection,NA
+R_8H5g2xJLrHHDEPv,I have used tidymodels packages many times,I work in industry,Q5_3,0,Probability calibration (post modeling),NA
+R_8H5g2xJLrHHDEPv,I have used tidymodels packages many times,I work in industry,Q5_4,0,Probability threshold optimization,NA
+R_8H5g2xJLrHHDEPv,I have used tidymodels packages many times,I work in industry,Q5_5,0,Spatial analysis models and methods,NA
+R_8H5g2xJLrHHDEPv,I have used tidymodels packages many times,I work in industry,Q5_6,5,Better serialization tools ,NA
+R_8H5g2xJLrHHDEPv,I have used tidymodels packages many times,I work in industry,Q5_10,90,H2O.ai support ,NA
+R_8H5g2xJLrHHDEPv,I have used tidymodels packages many times,I work in industry,Q5_12,0,Other,NA
+R_3dLzN9nZ0mbm2gE,I have used tidymodels packages a few times,I work in industry,Q5_1,1,Model fairness analysis and metrics,NA
+R_3dLzN9nZ0mbm2gE,I have used tidymodels packages a few times,I work in industry,Q5_2,15,Supervised feature selection,NA
+R_3dLzN9nZ0mbm2gE,I have used tidymodels packages a few times,I work in industry,Q5_3,3,Probability calibration (post modeling),NA
+R_3dLzN9nZ0mbm2gE,I have used tidymodels packages a few times,I work in industry,Q5_4,10,Probability threshold optimization,NA
+R_3dLzN9nZ0mbm2gE,I have used tidymodels packages a few times,I work in industry,Q5_5,1,Spatial analysis models and methods,NA
+R_3dLzN9nZ0mbm2gE,I have used tidymodels packages a few times,I work in industry,Q5_6,10,Better serialization tools ,NA
+R_3dLzN9nZ0mbm2gE,I have used tidymodels packages a few times,I work in industry,Q5_10,55,H2O.ai support ,NA
+R_3dLzN9nZ0mbm2gE,I have used tidymodels packages a few times,I work in industry,Q5_12,5,Other,pipeline management - there is so much to remember to go from start to finish on a model
+R_2cqhNRff7VH3iFA,I have used tidymodels packages a few times,I am a student,Q5_1,10,Model fairness analysis and metrics,NA
+R_2cqhNRff7VH3iFA,I have used tidymodels packages a few times,I am a student,Q5_2,10,Supervised feature selection,NA
+R_2cqhNRff7VH3iFA,I have used tidymodels packages a few times,I am a student,Q5_3,20,Probability calibration (post modeling),NA
+R_2cqhNRff7VH3iFA,I have used tidymodels packages a few times,I am a student,Q5_4,0,Probability threshold optimization,NA
+R_2cqhNRff7VH3iFA,I have used tidymodels packages a few times,I am a student,Q5_5,0,Spatial analysis models and methods,NA
+R_2cqhNRff7VH3iFA,I have used tidymodels packages a few times,I am a student,Q5_6,30,Better serialization tools ,NA
+R_2cqhNRff7VH3iFA,I have used tidymodels packages a few times,I am a student,Q5_10,10,H2O.ai support ,NA
+R_2cqhNRff7VH3iFA,I have used tidymodels packages a few times,I am a student,Q5_12,20,Other,Documentation / examples
+R_XuZmxpYLLDNleuJ,I have used tidymodels packages many times,I work in industry,Q5_1,30,Model fairness analysis and metrics,NA
+R_XuZmxpYLLDNleuJ,I have used tidymodels packages many times,I work in industry,Q5_2,10,Supervised feature selection,NA
+R_XuZmxpYLLDNleuJ,I have used tidymodels packages many times,I work in industry,Q5_3,30,Probability calibration (post modeling),NA
+R_XuZmxpYLLDNleuJ,I have used tidymodels packages many times,I work in industry,Q5_4,10,Probability threshold optimization,NA
+R_XuZmxpYLLDNleuJ,I have used tidymodels packages many times,I work in industry,Q5_5,10,Spatial analysis models and methods,NA
+R_XuZmxpYLLDNleuJ,I have used tidymodels packages many times,I work in industry,Q5_6,5,Better serialization tools ,NA
+R_XuZmxpYLLDNleuJ,I have used tidymodels packages many times,I work in industry,Q5_10,5,H2O.ai support ,NA
+R_XuZmxpYLLDNleuJ,I have used tidymodels packages many times,I work in industry,Q5_12,0,Other,NA
+R_qXfO8wf6MaBxrNv,I have used tidymodels packages many times,I work in industry,Q5_1,0,Model fairness analysis and metrics,NA
+R_qXfO8wf6MaBxrNv,I have used tidymodels packages many times,I work in industry,Q5_2,50,Supervised feature selection,NA
+R_qXfO8wf6MaBxrNv,I have used tidymodels packages many times,I work in industry,Q5_3,50,Probability calibration (post modeling),NA
+R_qXfO8wf6MaBxrNv,I have used tidymodels packages many times,I work in industry,Q5_4,0,Probability threshold optimization,NA
+R_qXfO8wf6MaBxrNv,I have used tidymodels packages many times,I work in industry,Q5_5,0,Spatial analysis models and methods,NA
+R_qXfO8wf6MaBxrNv,I have used tidymodels packages many times,I work in industry,Q5_6,0,Better serialization tools ,NA
+R_qXfO8wf6MaBxrNv,I have used tidymodels packages many times,I work in industry,Q5_10,0,H2O.ai support ,NA
+R_qXfO8wf6MaBxrNv,I have used tidymodels packages many times,I work in industry,Q5_12,0,Other,NA
+R_3jTeRB2lDvR5sIU,I have used tidymodels packages many times,I work in industry,Q5_1,0,Model fairness analysis and metrics,NA
+R_3jTeRB2lDvR5sIU,I have used tidymodels packages many times,I work in industry,Q5_2,70,Supervised feature selection,NA
+R_3jTeRB2lDvR5sIU,I have used tidymodels packages many times,I work in industry,Q5_3,0,Probability calibration (post modeling),NA
+R_3jTeRB2lDvR5sIU,I have used tidymodels packages many times,I work in industry,Q5_4,30,Probability threshold optimization,NA
+R_3jTeRB2lDvR5sIU,I have used tidymodels packages many times,I work in industry,Q5_5,0,Spatial analysis models and methods,NA
+R_3jTeRB2lDvR5sIU,I have used tidymodels packages many times,I work in industry,Q5_6,0,Better serialization tools ,NA
+R_3jTeRB2lDvR5sIU,I have used tidymodels packages many times,I work in industry,Q5_10,0,H2O.ai support ,NA
+R_3jTeRB2lDvR5sIU,I have used tidymodels packages many times,I work in industry,Q5_12,0,Other,NA
+R_7UnpWDB3vKS1fm9,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_1,0,Model fairness analysis and metrics,NA
+R_7UnpWDB3vKS1fm9,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_2,0,Supervised feature selection,NA
+R_7UnpWDB3vKS1fm9,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_3,80,Probability calibration (post modeling),NA
+R_7UnpWDB3vKS1fm9,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_4,20,Probability threshold optimization,NA
+R_7UnpWDB3vKS1fm9,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_5,0,Spatial analysis models and methods,NA
+R_7UnpWDB3vKS1fm9,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_6,0,Better serialization tools ,NA
+R_7UnpWDB3vKS1fm9,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_10,0,H2O.ai support ,NA
+R_7UnpWDB3vKS1fm9,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_12,0,Other,NA
+R_x4uufiNLms2h1uh,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_1,10,Model fairness analysis and metrics,NA
+R_x4uufiNLms2h1uh,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_2,20,Supervised feature selection,NA
+R_x4uufiNLms2h1uh,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_3,30,Probability calibration (post modeling),NA
+R_x4uufiNLms2h1uh,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_4,0,Probability threshold optimization,NA
+R_x4uufiNLms2h1uh,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_5,0,Spatial analysis models and methods,NA
+R_x4uufiNLms2h1uh,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_6,40,Better serialization tools ,NA
+R_x4uufiNLms2h1uh,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_10,0,H2O.ai support ,NA
+R_x4uufiNLms2h1uh,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_12,0,Other,NA
+R_3iDyskawJAftvla,I have used tidymodels packages a few times,I work in industry,Q5_1,0,Model fairness analysis and metrics,NA
+R_3iDyskawJAftvla,I have used tidymodels packages a few times,I work in industry,Q5_2,30,Supervised feature selection,NA
+R_3iDyskawJAftvla,I have used tidymodels packages a few times,I work in industry,Q5_3,30,Probability calibration (post modeling),NA
+R_3iDyskawJAftvla,I have used tidymodels packages a few times,I work in industry,Q5_4,30,Probability threshold optimization,NA
+R_3iDyskawJAftvla,I have used tidymodels packages a few times,I work in industry,Q5_5,0,Spatial analysis models and methods,NA
+R_3iDyskawJAftvla,I have used tidymodels packages a few times,I work in industry,Q5_6,10,Better serialization tools ,NA
+R_3iDyskawJAftvla,I have used tidymodels packages a few times,I work in industry,Q5_10,0,H2O.ai support ,NA
+R_3iDyskawJAftvla,I have used tidymodels packages a few times,I work in industry,Q5_12,0,Other,NA
+R_tQgDCfn4LcMa3Tz,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_1,5,Model fairness analysis and metrics,NA
+R_tQgDCfn4LcMa3Tz,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_2,10,Supervised feature selection,NA
+R_tQgDCfn4LcMa3Tz,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_3,5,Probability calibration (post modeling),NA
+R_tQgDCfn4LcMa3Tz,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_4,20,Probability threshold optimization,NA
+R_tQgDCfn4LcMa3Tz,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_5,5,Spatial analysis models and methods,NA
+R_tQgDCfn4LcMa3Tz,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_6,15,Better serialization tools ,NA
+R_tQgDCfn4LcMa3Tz,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_10,30,H2O.ai support ,NA
+R_tQgDCfn4LcMa3Tz,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_12,10,Other,Implement survival forests from the ranger package
+R_2w4gEHiqetQ7SiD,I have used tidymodels packages a few times,I work in industry,Q5_1,20,Model fairness analysis and metrics,NA
+R_2w4gEHiqetQ7SiD,I have used tidymodels packages a few times,I work in industry,Q5_2,20,Supervised feature selection,NA
+R_2w4gEHiqetQ7SiD,I have used tidymodels packages a few times,I work in industry,Q5_3,10,Probability calibration (post modeling),NA
+R_2w4gEHiqetQ7SiD,I have used tidymodels packages a few times,I work in industry,Q5_4,10,Probability threshold optimization,NA
+R_2w4gEHiqetQ7SiD,I have used tidymodels packages a few times,I work in industry,Q5_5,20,Spatial analysis models and methods,NA
+R_2w4gEHiqetQ7SiD,I have used tidymodels packages a few times,I work in industry,Q5_6,20,Better serialization tools ,NA
+R_2w4gEHiqetQ7SiD,I have used tidymodels packages a few times,I work in industry,Q5_10,0,H2O.ai support ,NA
+R_2w4gEHiqetQ7SiD,I have used tidymodels packages a few times,I work in industry,Q5_12,0,Other,NA
+R_28XNZ9rTSnaiyzG,I have used tidymodels packages a few times,I work in industry,Q5_1,25,Model fairness analysis and metrics,NA
+R_28XNZ9rTSnaiyzG,I have used tidymodels packages a few times,I work in industry,Q5_2,15,Supervised feature selection,NA
+R_28XNZ9rTSnaiyzG,I have used tidymodels packages a few times,I work in industry,Q5_3,20,Probability calibration (post modeling),NA
+R_28XNZ9rTSnaiyzG,I have used tidymodels packages a few times,I work in industry,Q5_4,10,Probability threshold optimization,NA
+R_28XNZ9rTSnaiyzG,I have used tidymodels packages a few times,I work in industry,Q5_5,10,Spatial analysis models and methods,NA
+R_28XNZ9rTSnaiyzG,I have used tidymodels packages a few times,I work in industry,Q5_6,20,Better serialization tools ,NA
+R_28XNZ9rTSnaiyzG,I have used tidymodels packages a few times,I work in industry,Q5_10,0,H2O.ai support ,NA
+R_28XNZ9rTSnaiyzG,I have used tidymodels packages a few times,I work in industry,Q5_12,0,Other,NA
+R_3MGa2nANTBYJzcG,I have used tidymodels packages a few times,I work in industry,Q5_1,50,Model fairness analysis and metrics,NA
+R_3MGa2nANTBYJzcG,I have used tidymodels packages a few times,I work in industry,Q5_2,0,Supervised feature selection,NA
+R_3MGa2nANTBYJzcG,I have used tidymodels packages a few times,I work in industry,Q5_3,40,Probability calibration (post modeling),NA
+R_3MGa2nANTBYJzcG,I have used tidymodels packages a few times,I work in industry,Q5_4,10,Probability threshold optimization,NA
+R_3MGa2nANTBYJzcG,I have used tidymodels packages a few times,I work in industry,Q5_5,0,Spatial analysis models and methods,NA
+R_3MGa2nANTBYJzcG,I have used tidymodels packages a few times,I work in industry,Q5_6,0,Better serialization tools ,NA
+R_3MGa2nANTBYJzcG,I have used tidymodels packages a few times,I work in industry,Q5_10,0,H2O.ai support ,NA
+R_3MGa2nANTBYJzcG,I have used tidymodels packages a few times,I work in industry,Q5_12,0,Other,NA
+R_rf31omPHr9Qjj1v,I have used tidymodels packages many times,I am a student,Q5_1,0,Model fairness analysis and metrics,NA
+R_rf31omPHr9Qjj1v,I have used tidymodels packages many times,I am a student,Q5_2,0,Supervised feature selection,NA
+R_rf31omPHr9Qjj1v,I have used tidymodels packages many times,I am a student,Q5_3,0,Probability calibration (post modeling),NA
+R_rf31omPHr9Qjj1v,I have used tidymodels packages many times,I am a student,Q5_4,0,Probability threshold optimization,NA
+R_rf31omPHr9Qjj1v,I have used tidymodels packages many times,I am a student,Q5_5,0,Spatial analysis models and methods,NA
+R_rf31omPHr9Qjj1v,I have used tidymodels packages many times,I am a student,Q5_6,100,Better serialization tools ,NA
+R_rf31omPHr9Qjj1v,I have used tidymodels packages many times,I am a student,Q5_10,0,H2O.ai support ,NA
+R_rf31omPHr9Qjj1v,I have used tidymodels packages many times,I am a student,Q5_12,0,Other,NA
+R_1P1XEaViqBkqfrt,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_1,0,Model fairness analysis and metrics,NA
+R_1P1XEaViqBkqfrt,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_2,100,Supervised feature selection,NA
+R_1P1XEaViqBkqfrt,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_3,0,Probability calibration (post modeling),NA
+R_1P1XEaViqBkqfrt,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_4,0,Probability threshold optimization,NA
+R_1P1XEaViqBkqfrt,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_5,0,Spatial analysis models and methods,NA
+R_1P1XEaViqBkqfrt,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_6,0,Better serialization tools ,NA
+R_1P1XEaViqBkqfrt,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_10,0,H2O.ai support ,NA
+R_1P1XEaViqBkqfrt,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_12,0,Other,NA
+R_2A12JDEhgLCvELV,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_1,0,Model fairness analysis and metrics,NA
+R_2A12JDEhgLCvELV,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_2,0,Supervised feature selection,NA
+R_2A12JDEhgLCvELV,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_3,0,Probability calibration (post modeling),NA
+R_2A12JDEhgLCvELV,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_4,0,Probability threshold optimization,NA
+R_2A12JDEhgLCvELV,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_5,0,Spatial analysis models and methods,NA
+R_2A12JDEhgLCvELV,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_6,0,Better serialization tools ,NA
+R_2A12JDEhgLCvELV,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_10,0,H2O.ai support ,NA
+R_2A12JDEhgLCvELV,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_12,100,Other,Class and case weights please!
+R_D2heYFvtfst2fQt,I have used tidymodels packages many times,I work in industry,Q5_1,18,Model fairness analysis and metrics,NA
+R_D2heYFvtfst2fQt,I have used tidymodels packages many times,I work in industry,Q5_2,18,Supervised feature selection,NA
+R_D2heYFvtfst2fQt,I have used tidymodels packages many times,I work in industry,Q5_3,24,Probability calibration (post modeling),NA
+R_D2heYFvtfst2fQt,I have used tidymodels packages many times,I work in industry,Q5_4,20,Probability threshold optimization,NA
+R_D2heYFvtfst2fQt,I have used tidymodels packages many times,I work in industry,Q5_5,1,Spatial analysis models and methods,NA
+R_D2heYFvtfst2fQt,I have used tidymodels packages many times,I work in industry,Q5_6,3,Better serialization tools ,NA
+R_D2heYFvtfst2fQt,I have used tidymodels packages many times,I work in industry,Q5_10,12,H2O.ai support ,NA
+R_D2heYFvtfst2fQt,I have used tidymodels packages many times,I work in industry,Q5_12,4,Other,Psychometrics (TAM)
+R_3jdkPkandG88VUM,I have used tidymodels packages many times,I work in industry,Q5_1,0,Model fairness analysis and metrics,NA
+R_3jdkPkandG88VUM,I have used tidymodels packages many times,I work in industry,Q5_2,20,Supervised feature selection,NA
+R_3jdkPkandG88VUM,I have used tidymodels packages many times,I work in industry,Q5_3,0,Probability calibration (post modeling),NA
+R_3jdkPkandG88VUM,I have used tidymodels packages many times,I work in industry,Q5_4,0,Probability threshold optimization,NA
+R_3jdkPkandG88VUM,I have used tidymodels packages many times,I work in industry,Q5_5,0,Spatial analysis models and methods,NA
+R_3jdkPkandG88VUM,I have used tidymodels packages many times,I work in industry,Q5_6,0,Better serialization tools ,NA
+R_3jdkPkandG88VUM,I have used tidymodels packages many times,I work in industry,Q5_10,0,H2O.ai support ,NA
+R_3jdkPkandG88VUM,I have used tidymodels packages many times,I work in industry,Q5_12,80,Other,improve workflow sets to easily compare multiple models
+R_1CdYnfLaZizvydQ,I have used tidymodels packages many times,I work in industry,Q5_1,30,Model fairness analysis and metrics,NA
+R_1CdYnfLaZizvydQ,I have used tidymodels packages many times,I work in industry,Q5_2,20,Supervised feature selection,NA
+R_1CdYnfLaZizvydQ,I have used tidymodels packages many times,I work in industry,Q5_3,10,Probability calibration (post modeling),NA
+R_1CdYnfLaZizvydQ,I have used tidymodels packages many times,I work in industry,Q5_4,0,Probability threshold optimization,NA
+R_1CdYnfLaZizvydQ,I have used tidymodels packages many times,I work in industry,Q5_5,0,Spatial analysis models and methods,NA
+R_1CdYnfLaZizvydQ,I have used tidymodels packages many times,I work in industry,Q5_6,20,Better serialization tools ,NA
+R_1CdYnfLaZizvydQ,I have used tidymodels packages many times,I work in industry,Q5_10,20,H2O.ai support ,NA
+R_1CdYnfLaZizvydQ,I have used tidymodels packages many times,I work in industry,Q5_12,0,Other,NA
+R_2ByfFifnF64Vhtm,I have used tidymodels packages many times,I work in industry,Q5_1,0,Model fairness analysis and metrics,NA
+R_2ByfFifnF64Vhtm,I have used tidymodels packages many times,I work in industry,Q5_2,70,Supervised feature selection,NA
+R_2ByfFifnF64Vhtm,I have used tidymodels packages many times,I work in industry,Q5_3,10,Probability calibration (post modeling),NA
+R_2ByfFifnF64Vhtm,I have used tidymodels packages many times,I work in industry,Q5_4,10,Probability threshold optimization,NA
+R_2ByfFifnF64Vhtm,I have used tidymodels packages many times,I work in industry,Q5_5,10,Spatial analysis models and methods,NA
+R_2ByfFifnF64Vhtm,I have used tidymodels packages many times,I work in industry,Q5_6,0,Better serialization tools ,NA
+R_2ByfFifnF64Vhtm,I have used tidymodels packages many times,I work in industry,Q5_10,0,H2O.ai support ,NA
+R_2ByfFifnF64Vhtm,I have used tidymodels packages many times,I work in industry,Q5_12,0,Other,NA
+R_OIpDWygHOluzQ65,I have used tidymodels packages many times,I work in industry,Q5_1,30,Model fairness analysis and metrics,NA
+R_OIpDWygHOluzQ65,I have used tidymodels packages many times,I work in industry,Q5_2,0,Supervised feature selection,NA
+R_OIpDWygHOluzQ65,I have used tidymodels packages many times,I work in industry,Q5_3,0,Probability calibration (post modeling),NA
+R_OIpDWygHOluzQ65,I have used tidymodels packages many times,I work in industry,Q5_4,50,Probability threshold optimization,NA
+R_OIpDWygHOluzQ65,I have used tidymodels packages many times,I work in industry,Q5_5,0,Spatial analysis models and methods,NA
+R_OIpDWygHOluzQ65,I have used tidymodels packages many times,I work in industry,Q5_6,20,Better serialization tools ,NA
+R_OIpDWygHOluzQ65,I have used tidymodels packages many times,I work in industry,Q5_10,0,H2O.ai support ,NA
+R_OIpDWygHOluzQ65,I have used tidymodels packages many times,I work in industry,Q5_12,0,Other,NA
+R_1FlmuV8dmwZ8w1e,I have used tidymodels packages a few times,I work in industry,Q5_1,0,Model fairness analysis and metrics,NA
+R_1FlmuV8dmwZ8w1e,I have used tidymodels packages a few times,I work in industry,Q5_2,0,Supervised feature selection,NA
+R_1FlmuV8dmwZ8w1e,I have used tidymodels packages a few times,I work in industry,Q5_3,0,Probability calibration (post modeling),NA
+R_1FlmuV8dmwZ8w1e,I have used tidymodels packages a few times,I work in industry,Q5_4,20,Probability threshold optimization,NA
+R_1FlmuV8dmwZ8w1e,I have used tidymodels packages a few times,I work in industry,Q5_5,0,Spatial analysis models and methods,NA
+R_1FlmuV8dmwZ8w1e,I have used tidymodels packages a few times,I work in industry,Q5_6,0,Better serialization tools ,NA
+R_1FlmuV8dmwZ8w1e,I have used tidymodels packages a few times,I work in industry,Q5_10,0,H2O.ai support ,NA
+R_1FlmuV8dmwZ8w1e,I have used tidymodels packages a few times,I work in industry,Q5_12,80,Other,"SOTA NLP support (GPT, BERT models and similar, huggingface)"
+R_3KZAdQIZdkqzJhS,I have used tidymodels packages a few times,I am a student,Q5_1,20,Model fairness analysis and metrics,NA
+R_3KZAdQIZdkqzJhS,I have used tidymodels packages a few times,I am a student,Q5_2,10,Supervised feature selection,NA
+R_3KZAdQIZdkqzJhS,I have used tidymodels packages a few times,I am a student,Q5_3,10,Probability calibration (post modeling),NA
+R_3KZAdQIZdkqzJhS,I have used tidymodels packages a few times,I am a student,Q5_4,5,Probability threshold optimization,NA
+R_3KZAdQIZdkqzJhS,I have used tidymodels packages a few times,I am a student,Q5_5,20,Spatial analysis models and methods,NA
+R_3KZAdQIZdkqzJhS,I have used tidymodels packages a few times,I am a student,Q5_6,30,Better serialization tools ,NA
+R_3KZAdQIZdkqzJhS,I have used tidymodels packages a few times,I am a student,Q5_10,5,H2O.ai support ,NA
+R_3KZAdQIZdkqzJhS,I have used tidymodels packages a few times,I am a student,Q5_12,0,Other,NA
+R_3JjX4xLwTUWxUw9,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_1,0,Model fairness analysis and metrics,NA
+R_3JjX4xLwTUWxUw9,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_2,0,Supervised feature selection,NA
+R_3JjX4xLwTUWxUw9,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_3,0,Probability calibration (post modeling),NA
+R_3JjX4xLwTUWxUw9,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_4,0,Probability threshold optimization,NA
+R_3JjX4xLwTUWxUw9,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_5,0,Spatial analysis models and methods,NA
+R_3JjX4xLwTUWxUw9,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_6,0,Better serialization tools ,NA
+R_3JjX4xLwTUWxUw9,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_10,0,H2O.ai support ,NA
+R_3JjX4xLwTUWxUw9,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_12,100,Other,More Survival analysis
+R_qF0uALWCafsLYn7,I have used tidymodels packages many times,I work in industry,Q5_1,0,Model fairness analysis and metrics,NA
+R_qF0uALWCafsLYn7,I have used tidymodels packages many times,I work in industry,Q5_2,20,Supervised feature selection,NA
+R_qF0uALWCafsLYn7,I have used tidymodels packages many times,I work in industry,Q5_3,30,Probability calibration (post modeling),NA
+R_qF0uALWCafsLYn7,I have used tidymodels packages many times,I work in industry,Q5_4,20,Probability threshold optimization,NA
+R_qF0uALWCafsLYn7,I have used tidymodels packages many times,I work in industry,Q5_5,30,Spatial analysis models and methods,NA
+R_qF0uALWCafsLYn7,I have used tidymodels packages many times,I work in industry,Q5_6,0,Better serialization tools ,NA
+R_qF0uALWCafsLYn7,I have used tidymodels packages many times,I work in industry,Q5_10,0,H2O.ai support ,NA
+R_qF0uALWCafsLYn7,I have used tidymodels packages many times,I work in industry,Q5_12,0,Other,NA
+R_32XUZkQfW7E9wkI,I have used tidymodels packages many times,I work in industry,Q5_1,0,Model fairness analysis and metrics,NA
+R_32XUZkQfW7E9wkI,I have used tidymodels packages many times,I work in industry,Q5_2,0,Supervised feature selection,NA
+R_32XUZkQfW7E9wkI,I have used tidymodels packages many times,I work in industry,Q5_3,0,Probability calibration (post modeling),NA
+R_32XUZkQfW7E9wkI,I have used tidymodels packages many times,I work in industry,Q5_4,0,Probability threshold optimization,NA
+R_32XUZkQfW7E9wkI,I have used tidymodels packages many times,I work in industry,Q5_5,50,Spatial analysis models and methods,NA
+R_32XUZkQfW7E9wkI,I have used tidymodels packages many times,I work in industry,Q5_6,0,Better serialization tools ,NA
+R_32XUZkQfW7E9wkI,I have used tidymodels packages many times,I work in industry,Q5_10,50,H2O.ai support ,NA
+R_32XUZkQfW7E9wkI,I have used tidymodels packages many times,I work in industry,Q5_12,0,Other,NA
+R_21h7wTmTe5sAmMK,I have never used tidymodels,I work in industry,Q5_1,0,Model fairness analysis and metrics,NA
+R_21h7wTmTe5sAmMK,I have never used tidymodels,I work in industry,Q5_2,30,Supervised feature selection,NA
+R_21h7wTmTe5sAmMK,I have never used tidymodels,I work in industry,Q5_3,35,Probability calibration (post modeling),NA
+R_21h7wTmTe5sAmMK,I have never used tidymodels,I work in industry,Q5_4,35,Probability threshold optimization,NA
+R_21h7wTmTe5sAmMK,I have never used tidymodels,I work in industry,Q5_5,0,Spatial analysis models and methods,NA
+R_21h7wTmTe5sAmMK,I have never used tidymodels,I work in industry,Q5_6,0,Better serialization tools ,NA
+R_21h7wTmTe5sAmMK,I have never used tidymodels,I work in industry,Q5_10,0,H2O.ai support ,NA
+R_21h7wTmTe5sAmMK,I have never used tidymodels,I work in industry,Q5_12,0,Other,NA
+R_5uKNW9gtGVaMIbn,I have used tidymodels packages a few times,I work in industry,Q5_1,20,Model fairness analysis and metrics,NA
+R_5uKNW9gtGVaMIbn,I have used tidymodels packages a few times,I work in industry,Q5_2,0,Supervised feature selection,NA
+R_5uKNW9gtGVaMIbn,I have used tidymodels packages a few times,I work in industry,Q5_3,15,Probability calibration (post modeling),NA
+R_5uKNW9gtGVaMIbn,I have used tidymodels packages a few times,I work in industry,Q5_4,15,Probability threshold optimization,NA
+R_5uKNW9gtGVaMIbn,I have used tidymodels packages a few times,I work in industry,Q5_5,0,Spatial analysis models and methods,NA
+R_5uKNW9gtGVaMIbn,I have used tidymodels packages a few times,I work in industry,Q5_6,0,Better serialization tools ,NA
+R_5uKNW9gtGVaMIbn,I have used tidymodels packages a few times,I work in industry,Q5_10,0,H2O.ai support ,NA
+R_5uKNW9gtGVaMIbn,I have used tidymodels packages a few times,I work in industry,Q5_12,50,Other,No support for weights #136
+R_2V4SdfxQ9MCy0PQ,I have used tidymodels packages many times,I work in industry,Q5_1,0,Model fairness analysis and metrics,NA
+R_2V4SdfxQ9MCy0PQ,I have used tidymodels packages many times,I work in industry,Q5_2,0,Supervised feature selection,NA
+R_2V4SdfxQ9MCy0PQ,I have used tidymodels packages many times,I work in industry,Q5_3,0,Probability calibration (post modeling),NA
+R_2V4SdfxQ9MCy0PQ,I have used tidymodels packages many times,I work in industry,Q5_4,0,Probability threshold optimization,NA
+R_2V4SdfxQ9MCy0PQ,I have used tidymodels packages many times,I work in industry,Q5_5,0,Spatial analysis models and methods,NA
+R_2V4SdfxQ9MCy0PQ,I have used tidymodels packages many times,I work in industry,Q5_6,0,Better serialization tools ,NA
+R_2V4SdfxQ9MCy0PQ,I have used tidymodels packages many times,I work in industry,Q5_10,0,H2O.ai support ,NA
+R_2V4SdfxQ9MCy0PQ,I have used tidymodels packages many times,I work in industry,Q5_12,100,Other,spark integration
+R_1g1slAdSxCT9Zz0,I have never used tidymodels,I work in industry,Q5_1,0,Model fairness analysis and metrics,NA
+R_1g1slAdSxCT9Zz0,I have never used tidymodels,I work in industry,Q5_2,50,Supervised feature selection,NA
+R_1g1slAdSxCT9Zz0,I have never used tidymodels,I work in industry,Q5_3,0,Probability calibration (post modeling),NA
+R_1g1slAdSxCT9Zz0,I have never used tidymodels,I work in industry,Q5_4,0,Probability threshold optimization,NA
+R_1g1slAdSxCT9Zz0,I have never used tidymodels,I work in industry,Q5_5,50,Spatial analysis models and methods,NA
+R_1g1slAdSxCT9Zz0,I have never used tidymodels,I work in industry,Q5_6,0,Better serialization tools ,NA
+R_1g1slAdSxCT9Zz0,I have never used tidymodels,I work in industry,Q5_10,0,H2O.ai support ,NA
+R_1g1slAdSxCT9Zz0,I have never used tidymodels,I work in industry,Q5_12,0,Other,NA
+R_2dWQRtBBS1qLmGD,I have used tidymodels packages many times,I am a hobbyist,Q5_1,0,Model fairness analysis and metrics,NA
+R_2dWQRtBBS1qLmGD,I have used tidymodels packages many times,I am a hobbyist,Q5_2,0,Supervised feature selection,NA
+R_2dWQRtBBS1qLmGD,I have used tidymodels packages many times,I am a hobbyist,Q5_3,0,Probability calibration (post modeling),NA
+R_2dWQRtBBS1qLmGD,I have used tidymodels packages many times,I am a hobbyist,Q5_4,0,Probability threshold optimization,NA
+R_2dWQRtBBS1qLmGD,I have used tidymodels packages many times,I am a hobbyist,Q5_5,0,Spatial analysis models and methods,NA
+R_2dWQRtBBS1qLmGD,I have used tidymodels packages many times,I am a hobbyist,Q5_6,0,Better serialization tools ,NA
+R_2dWQRtBBS1qLmGD,I have used tidymodels packages many times,I am a hobbyist,Q5_10,0,H2O.ai support ,NA
+R_2dWQRtBBS1qLmGD,I have used tidymodels packages many times,I am a hobbyist,Q5_12,100,Other,Cheatsheet
+R_3Empvzk5sz3KBTL,I have used tidymodels packages many times,I work in industry,Q5_1,30,Model fairness analysis and metrics,NA
+R_3Empvzk5sz3KBTL,I have used tidymodels packages many times,I work in industry,Q5_2,20,Supervised feature selection,NA
+R_3Empvzk5sz3KBTL,I have used tidymodels packages many times,I work in industry,Q5_3,10,Probability calibration (post modeling),NA
+R_3Empvzk5sz3KBTL,I have used tidymodels packages many times,I work in industry,Q5_4,10,Probability threshold optimization,NA
+R_3Empvzk5sz3KBTL,I have used tidymodels packages many times,I work in industry,Q5_5,20,Spatial analysis models and methods,NA
+R_3Empvzk5sz3KBTL,I have used tidymodels packages many times,I work in industry,Q5_6,10,Better serialization tools ,NA
+R_3Empvzk5sz3KBTL,I have used tidymodels packages many times,I work in industry,Q5_10,0,H2O.ai support ,NA
+R_3Empvzk5sz3KBTL,I have used tidymodels packages many times,I work in industry,Q5_12,0,Other,NA
+R_1DJb61sMX3lq3An,I have used tidymodels packages many times,I work in industry,Q5_1,20,Model fairness analysis and metrics,NA
+R_1DJb61sMX3lq3An,I have used tidymodels packages many times,I work in industry,Q5_2,0,Supervised feature selection,NA
+R_1DJb61sMX3lq3An,I have used tidymodels packages many times,I work in industry,Q5_3,30,Probability calibration (post modeling),NA
+R_1DJb61sMX3lq3An,I have used tidymodels packages many times,I work in industry,Q5_4,50,Probability threshold optimization,NA
+R_1DJb61sMX3lq3An,I have used tidymodels packages many times,I work in industry,Q5_5,0,Spatial analysis models and methods,NA
+R_1DJb61sMX3lq3An,I have used tidymodels packages many times,I work in industry,Q5_6,0,Better serialization tools ,NA
+R_1DJb61sMX3lq3An,I have used tidymodels packages many times,I work in industry,Q5_10,0,H2O.ai support ,NA
+R_1DJb61sMX3lq3An,I have used tidymodels packages many times,I work in industry,Q5_12,0,Other,NA
+R_3qgm1JRkLFZ2HCV,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_1,100,Model fairness analysis and metrics,NA
+R_3qgm1JRkLFZ2HCV,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_2,0,Supervised feature selection,NA
+R_3qgm1JRkLFZ2HCV,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_3,0,Probability calibration (post modeling),NA
+R_3qgm1JRkLFZ2HCV,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_4,0,Probability threshold optimization,NA
+R_3qgm1JRkLFZ2HCV,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_5,0,Spatial analysis models and methods,NA
+R_3qgm1JRkLFZ2HCV,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_6,0,Better serialization tools ,NA
+R_3qgm1JRkLFZ2HCV,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_10,0,H2O.ai support ,NA
+R_3qgm1JRkLFZ2HCV,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_12,0,Other,NA
+R_2QrCtiNJShtEs8J,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_1,0,Model fairness analysis and metrics,NA
+R_2QrCtiNJShtEs8J,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_2,70,Supervised feature selection,NA
+R_2QrCtiNJShtEs8J,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_3,10,Probability calibration (post modeling),NA
+R_2QrCtiNJShtEs8J,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_4,20,Probability threshold optimization,NA
+R_2QrCtiNJShtEs8J,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_5,0,Spatial analysis models and methods,NA
+R_2QrCtiNJShtEs8J,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_6,0,Better serialization tools ,NA
+R_2QrCtiNJShtEs8J,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_10,0,H2O.ai support ,NA
+R_2QrCtiNJShtEs8J,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_12,0,Other,NA
+R_1LZ6dVgyQ7EuF04,I have used tidymodels packages a few times,I am a student,Q5_1,25,Model fairness analysis and metrics,NA
+R_1LZ6dVgyQ7EuF04,I have used tidymodels packages a few times,I am a student,Q5_2,10,Supervised feature selection,NA
+R_1LZ6dVgyQ7EuF04,I have used tidymodels packages a few times,I am a student,Q5_3,20,Probability calibration (post modeling),NA
+R_1LZ6dVgyQ7EuF04,I have used tidymodels packages a few times,I am a student,Q5_4,10,Probability threshold optimization,NA
+R_1LZ6dVgyQ7EuF04,I have used tidymodels packages a few times,I am a student,Q5_5,25,Spatial analysis models and methods,NA
+R_1LZ6dVgyQ7EuF04,I have used tidymodels packages a few times,I am a student,Q5_6,10,Better serialization tools ,NA
+R_1LZ6dVgyQ7EuF04,I have used tidymodels packages a few times,I am a student,Q5_10,0,H2O.ai support ,NA
+R_1LZ6dVgyQ7EuF04,I have used tidymodels packages a few times,I am a student,Q5_12,0,Other,NA
+R_3ezEyBmTqSEudm0,I have used tidymodels packages many times,I work in industry,Q5_1,0,Model fairness analysis and metrics,NA
+R_3ezEyBmTqSEudm0,I have used tidymodels packages many times,I work in industry,Q5_2,0,Supervised feature selection,NA
+R_3ezEyBmTqSEudm0,I have used tidymodels packages many times,I work in industry,Q5_3,0,Probability calibration (post modeling),NA
+R_3ezEyBmTqSEudm0,I have used tidymodels packages many times,I work in industry,Q5_4,20,Probability threshold optimization,NA
+R_3ezEyBmTqSEudm0,I have used tidymodels packages many times,I work in industry,Q5_5,0,Spatial analysis models and methods,NA
+R_3ezEyBmTqSEudm0,I have used tidymodels packages many times,I work in industry,Q5_6,0,Better serialization tools ,NA
+R_3ezEyBmTqSEudm0,I have used tidymodels packages many times,I work in industry,Q5_10,0,H2O.ai support ,NA
+R_3ezEyBmTqSEudm0,I have used tidymodels packages many times,I work in industry,Q5_12,80,Other,precision in cross validation
+R_RF6nSf2kwFANfvr,I have never used tidymodels,I work in industry,Q5_1,0,Model fairness analysis and metrics,NA
+R_RF6nSf2kwFANfvr,I have never used tidymodels,I work in industry,Q5_2,0,Supervised feature selection,NA
+R_RF6nSf2kwFANfvr,I have never used tidymodels,I work in industry,Q5_3,0,Probability calibration (post modeling),NA
+R_RF6nSf2kwFANfvr,I have never used tidymodels,I work in industry,Q5_4,0,Probability threshold optimization,NA
+R_RF6nSf2kwFANfvr,I have never used tidymodels,I work in industry,Q5_5,0,Spatial analysis models and methods,NA
+R_RF6nSf2kwFANfvr,I have never used tidymodels,I work in industry,Q5_6,0,Better serialization tools ,NA
+R_RF6nSf2kwFANfvr,I have never used tidymodels,I work in industry,Q5_10,0,H2O.ai support ,NA
+R_RF6nSf2kwFANfvr,I have never used tidymodels,I work in industry,Q5_12,100,Other,timeseries forecasting (fable?)
+R_AtBlAIRN2MGWW2Z,I have contributed to tidymodels packages or taught others how to use them,"I am an academic, professor, and/or researcher",Q5_1,90,Model fairness analysis and metrics,NA
+R_AtBlAIRN2MGWW2Z,I have contributed to tidymodels packages or taught others how to use them,"I am an academic, professor, and/or researcher",Q5_2,10,Supervised feature selection,NA
+R_AtBlAIRN2MGWW2Z,I have contributed to tidymodels packages or taught others how to use them,"I am an academic, professor, and/or researcher",Q5_3,0,Probability calibration (post modeling),NA
+R_AtBlAIRN2MGWW2Z,I have contributed to tidymodels packages or taught others how to use them,"I am an academic, professor, and/or researcher",Q5_4,0,Probability threshold optimization,NA
+R_AtBlAIRN2MGWW2Z,I have contributed to tidymodels packages or taught others how to use them,"I am an academic, professor, and/or researcher",Q5_5,0,Spatial analysis models and methods,NA
+R_AtBlAIRN2MGWW2Z,I have contributed to tidymodels packages or taught others how to use them,"I am an academic, professor, and/or researcher",Q5_6,0,Better serialization tools ,NA
+R_AtBlAIRN2MGWW2Z,I have contributed to tidymodels packages or taught others how to use them,"I am an academic, professor, and/or researcher",Q5_10,0,H2O.ai support ,NA
+R_AtBlAIRN2MGWW2Z,I have contributed to tidymodels packages or taught others how to use them,"I am an academic, professor, and/or researcher",Q5_12,0,Other,NA
+R_10ShaZx96A6gk1E,I have used tidymodels packages many times,I work in industry,Q5_1,20,Model fairness analysis and metrics,NA
+R_10ShaZx96A6gk1E,I have used tidymodels packages many times,I work in industry,Q5_2,10,Supervised feature selection,NA
+R_10ShaZx96A6gk1E,I have used tidymodels packages many times,I work in industry,Q5_3,10,Probability calibration (post modeling),NA
+R_10ShaZx96A6gk1E,I have used tidymodels packages many times,I work in industry,Q5_4,25,Probability threshold optimization,NA
+R_10ShaZx96A6gk1E,I have used tidymodels packages many times,I work in industry,Q5_5,5,Spatial analysis models and methods,NA
+R_10ShaZx96A6gk1E,I have used tidymodels packages many times,I work in industry,Q5_6,10,Better serialization tools ,NA
+R_10ShaZx96A6gk1E,I have used tidymodels packages many times,I work in industry,Q5_10,15,H2O.ai support ,NA
+R_10ShaZx96A6gk1E,I have used tidymodels packages many times,I work in industry,Q5_12,5,Other,Faster parallelisation
+R_D8kg4verlBPdAwV,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_1,25,Model fairness analysis and metrics,NA
+R_D8kg4verlBPdAwV,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_2,75,Supervised feature selection,NA
+R_D8kg4verlBPdAwV,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_3,0,Probability calibration (post modeling),NA
+R_D8kg4verlBPdAwV,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_4,0,Probability threshold optimization,NA
+R_D8kg4verlBPdAwV,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_5,0,Spatial analysis models and methods,NA
+R_D8kg4verlBPdAwV,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_6,0,Better serialization tools ,NA
+R_D8kg4verlBPdAwV,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_10,0,H2O.ai support ,NA
+R_D8kg4verlBPdAwV,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_12,0,Other,NA
+R_2t9DFDPhvxVmCI8,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_1,0,Model fairness analysis and metrics,NA
+R_2t9DFDPhvxVmCI8,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_2,10,Supervised feature selection,NA
+R_2t9DFDPhvxVmCI8,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_3,20,Probability calibration (post modeling),NA
+R_2t9DFDPhvxVmCI8,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_4,30,Probability threshold optimization,NA
+R_2t9DFDPhvxVmCI8,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_5,0,Spatial analysis models and methods,NA
+R_2t9DFDPhvxVmCI8,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_6,20,Better serialization tools ,NA
+R_2t9DFDPhvxVmCI8,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_10,0,H2O.ai support ,NA
+R_2t9DFDPhvxVmCI8,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_12,20,Other,"Being able to split test/train based on grouped samples. E.g. I have 10 rows associated with one patient, I want all of them into the same test/train split."
+R_1mUGO8PLgPuSmUV,I have used tidymodels packages a few times,I work in industry,Q5_1,0,Model fairness analysis and metrics,NA
+R_1mUGO8PLgPuSmUV,I have used tidymodels packages a few times,I work in industry,Q5_2,50,Supervised feature selection,NA
+R_1mUGO8PLgPuSmUV,I have used tidymodels packages a few times,I work in industry,Q5_3,0,Probability calibration (post modeling),NA
+R_1mUGO8PLgPuSmUV,I have used tidymodels packages a few times,I work in industry,Q5_4,0,Probability threshold optimization,NA
+R_1mUGO8PLgPuSmUV,I have used tidymodels packages a few times,I work in industry,Q5_5,0,Spatial analysis models and methods,NA
+R_1mUGO8PLgPuSmUV,I have used tidymodels packages a few times,I work in industry,Q5_6,20,Better serialization tools ,NA
+R_1mUGO8PLgPuSmUV,I have used tidymodels packages a few times,I work in industry,Q5_10,30,H2O.ai support ,NA
+R_1mUGO8PLgPuSmUV,I have used tidymodels packages a few times,I work in industry,Q5_12,0,Other,NA
+R_AtVFRajnAtIyEhz,I have used tidymodels packages a few times,I work in industry,Q5_1,10,Model fairness analysis and metrics,NA
+R_AtVFRajnAtIyEhz,I have used tidymodels packages a few times,I work in industry,Q5_2,25,Supervised feature selection,NA
+R_AtVFRajnAtIyEhz,I have used tidymodels packages a few times,I work in industry,Q5_3,25,Probability calibration (post modeling),NA
+R_AtVFRajnAtIyEhz,I have used tidymodels packages a few times,I work in industry,Q5_4,10,Probability threshold optimization,NA
+R_AtVFRajnAtIyEhz,I have used tidymodels packages a few times,I work in industry,Q5_5,10,Spatial analysis models and methods,NA
+R_AtVFRajnAtIyEhz,I have used tidymodels packages a few times,I work in industry,Q5_6,10,Better serialization tools ,NA
+R_AtVFRajnAtIyEhz,I have used tidymodels packages a few times,I work in industry,Q5_10,10,H2O.ai support ,NA
+R_AtVFRajnAtIyEhz,I have used tidymodels packages a few times,I work in industry,Q5_12,0,Other,NA
+R_31Rj71cncwgoiNM,I have used tidymodels packages many times,I work in industry,Q5_1,80,Model fairness analysis and metrics,NA
+R_31Rj71cncwgoiNM,I have used tidymodels packages many times,I work in industry,Q5_2,0,Supervised feature selection,NA
+R_31Rj71cncwgoiNM,I have used tidymodels packages many times,I work in industry,Q5_3,0,Probability calibration (post modeling),NA
+R_31Rj71cncwgoiNM,I have used tidymodels packages many times,I work in industry,Q5_4,0,Probability threshold optimization,NA
+R_31Rj71cncwgoiNM,I have used tidymodels packages many times,I work in industry,Q5_5,0,Spatial analysis models and methods,NA
+R_31Rj71cncwgoiNM,I have used tidymodels packages many times,I work in industry,Q5_6,20,Better serialization tools ,NA
+R_31Rj71cncwgoiNM,I have used tidymodels packages many times,I work in industry,Q5_10,0,H2O.ai support ,NA
+R_31Rj71cncwgoiNM,I have used tidymodels packages many times,I work in industry,Q5_12,0,Other,NA
+R_2tng4Z8dazK6EVu,I have used tidymodels packages many times,I work in industry,Q5_1,0,Model fairness analysis and metrics,NA
+R_2tng4Z8dazK6EVu,I have used tidymodels packages many times,I work in industry,Q5_2,0,Supervised feature selection,NA
+R_2tng4Z8dazK6EVu,I have used tidymodels packages many times,I work in industry,Q5_3,10,Probability calibration (post modeling),NA
+R_2tng4Z8dazK6EVu,I have used tidymodels packages many times,I work in industry,Q5_4,0,Probability threshold optimization,NA
+R_2tng4Z8dazK6EVu,I have used tidymodels packages many times,I work in industry,Q5_5,50,Spatial analysis models and methods,NA
+R_2tng4Z8dazK6EVu,I have used tidymodels packages many times,I work in industry,Q5_6,40,Better serialization tools ,NA
+R_2tng4Z8dazK6EVu,I have used tidymodels packages many times,I work in industry,Q5_10,0,H2O.ai support ,NA
+R_2tng4Z8dazK6EVu,I have used tidymodels packages many times,I work in industry,Q5_12,0,Other,NA
+R_33BZ1k64afZAzrb,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_1,10,Model fairness analysis and metrics,NA
+R_33BZ1k64afZAzrb,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_2,0,Supervised feature selection,NA
+R_33BZ1k64afZAzrb,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_3,10,Probability calibration (post modeling),NA
+R_33BZ1k64afZAzrb,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_4,80,Probability threshold optimization,NA
+R_33BZ1k64afZAzrb,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_5,0,Spatial analysis models and methods,NA
+R_33BZ1k64afZAzrb,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_6,0,Better serialization tools ,NA
+R_33BZ1k64afZAzrb,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_10,0,H2O.ai support ,NA
+R_33BZ1k64afZAzrb,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_12,0,Other,NA
+R_3niTJdlENjn6ly3,I have used tidymodels packages many times,I work in industry,Q5_1,25,Model fairness analysis and metrics,NA
+R_3niTJdlENjn6ly3,I have used tidymodels packages many times,I work in industry,Q5_2,0,Supervised feature selection,NA
+R_3niTJdlENjn6ly3,I have used tidymodels packages many times,I work in industry,Q5_3,0,Probability calibration (post modeling),NA
+R_3niTJdlENjn6ly3,I have used tidymodels packages many times,I work in industry,Q5_4,0,Probability threshold optimization,NA
+R_3niTJdlENjn6ly3,I have used tidymodels packages many times,I work in industry,Q5_5,0,Spatial analysis models and methods,NA
+R_3niTJdlENjn6ly3,I have used tidymodels packages many times,I work in industry,Q5_6,0,Better serialization tools ,NA
+R_3niTJdlENjn6ly3,I have used tidymodels packages many times,I work in industry,Q5_10,25,H2O.ai support ,NA
+R_3niTJdlENjn6ly3,I have used tidymodels packages many times,I work in industry,Q5_12,50,Other,support for offsets
+R_yXcnrrtcaUhpF8l,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_1,30,Model fairness analysis and metrics,NA
+R_yXcnrrtcaUhpF8l,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_2,0,Supervised feature selection,NA
+R_yXcnrrtcaUhpF8l,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_3,0,Probability calibration (post modeling),NA
+R_yXcnrrtcaUhpF8l,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_4,0,Probability threshold optimization,NA
+R_yXcnrrtcaUhpF8l,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_5,0,Spatial analysis models and methods,NA
+R_yXcnrrtcaUhpF8l,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_6,0,Better serialization tools ,NA
+R_yXcnrrtcaUhpF8l,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_10,0,H2O.ai support ,NA
+R_yXcnrrtcaUhpF8l,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_12,70,Other,Methods for generating and tuning case weights (e.g. exponential weighting for newer vs older data) and making use of those weights in feature engineering and model training
+R_3DiQBffe6yhuMPg,I have used tidymodels packages many times,I work in industry,Q5_1,10,Model fairness analysis and metrics,NA
+R_3DiQBffe6yhuMPg,I have used tidymodels packages many times,I work in industry,Q5_2,20,Supervised feature selection,NA
+R_3DiQBffe6yhuMPg,I have used tidymodels packages many times,I work in industry,Q5_3,20,Probability calibration (post modeling),NA
+R_3DiQBffe6yhuMPg,I have used tidymodels packages many times,I work in industry,Q5_4,10,Probability threshold optimization,NA
+R_3DiQBffe6yhuMPg,I have used tidymodels packages many times,I work in industry,Q5_5,0,Spatial analysis models and methods,NA
+R_3DiQBffe6yhuMPg,I have used tidymodels packages many times,I work in industry,Q5_6,20,Better serialization tools ,NA
+R_3DiQBffe6yhuMPg,I have used tidymodels packages many times,I work in industry,Q5_10,20,H2O.ai support ,NA
+R_3DiQBffe6yhuMPg,I have used tidymodels packages many times,I work in industry,Q5_12,0,Other,NA
+R_1ohESw8II3A6yI4,I have used tidymodels packages a few times,I work in industry,Q5_1,0,Model fairness analysis and metrics,NA
+R_1ohESw8II3A6yI4,I have used tidymodels packages a few times,I work in industry,Q5_2,80,Supervised feature selection,NA
+R_1ohESw8II3A6yI4,I have used tidymodels packages a few times,I work in industry,Q5_3,10,Probability calibration (post modeling),NA
+R_1ohESw8II3A6yI4,I have used tidymodels packages a few times,I work in industry,Q5_4,0,Probability threshold optimization,NA
+R_1ohESw8II3A6yI4,I have used tidymodels packages a few times,I work in industry,Q5_5,0,Spatial analysis models and methods,NA
+R_1ohESw8II3A6yI4,I have used tidymodels packages a few times,I work in industry,Q5_6,0,Better serialization tools ,NA
+R_1ohESw8II3A6yI4,I have used tidymodels packages a few times,I work in industry,Q5_10,10,H2O.ai support ,NA
+R_1ohESw8II3A6yI4,I have used tidymodels packages a few times,I work in industry,Q5_12,0,Other,NA
+R_0rAh0oOHD7AA2AN,I have used tidymodels packages a few times,I am a hobbyist,Q5_1,25,Model fairness analysis and metrics,NA
+R_0rAh0oOHD7AA2AN,I have used tidymodels packages a few times,I am a hobbyist,Q5_2,25,Supervised feature selection,NA
+R_0rAh0oOHD7AA2AN,I have used tidymodels packages a few times,I am a hobbyist,Q5_3,25,Probability calibration (post modeling),NA
+R_0rAh0oOHD7AA2AN,I have used tidymodels packages a few times,I am a hobbyist,Q5_4,25,Probability threshold optimization,NA
+R_0rAh0oOHD7AA2AN,I have used tidymodels packages a few times,I am a hobbyist,Q5_5,0,Spatial analysis models and methods,NA
+R_0rAh0oOHD7AA2AN,I have used tidymodels packages a few times,I am a hobbyist,Q5_6,0,Better serialization tools ,NA
+R_0rAh0oOHD7AA2AN,I have used tidymodels packages a few times,I am a hobbyist,Q5_10,0,H2O.ai support ,NA
+R_0rAh0oOHD7AA2AN,I have used tidymodels packages a few times,I am a hobbyist,Q5_12,0,Other,NA
+R_1I4wdTcQ8Wve9Vu,I have used tidymodels packages many times,I work in industry,Q5_1,30,Model fairness analysis and metrics,NA
+R_1I4wdTcQ8Wve9Vu,I have used tidymodels packages many times,I work in industry,Q5_2,0,Supervised feature selection,NA
+R_1I4wdTcQ8Wve9Vu,I have used tidymodels packages many times,I work in industry,Q5_3,0,Probability calibration (post modeling),NA
+R_1I4wdTcQ8Wve9Vu,I have used tidymodels packages many times,I work in industry,Q5_4,0,Probability threshold optimization,NA
+R_1I4wdTcQ8Wve9Vu,I have used tidymodels packages many times,I work in industry,Q5_5,0,Spatial analysis models and methods,NA
+R_1I4wdTcQ8Wve9Vu,I have used tidymodels packages many times,I work in industry,Q5_6,30,Better serialization tools ,NA
+R_1I4wdTcQ8Wve9Vu,I have used tidymodels packages many times,I work in industry,Q5_10,40,H2O.ai support ,NA
+R_1I4wdTcQ8Wve9Vu,I have used tidymodels packages many times,I work in industry,Q5_12,0,Other,NA
+R_3FIfuUdXth8ijTh,I have used tidymodels packages many times,I work in industry,Q5_1,20,Model fairness analysis and metrics,NA
+R_3FIfuUdXth8ijTh,I have used tidymodels packages many times,I work in industry,Q5_2,0,Supervised feature selection,NA
+R_3FIfuUdXth8ijTh,I have used tidymodels packages many times,I work in industry,Q5_3,20,Probability calibration (post modeling),NA
+R_3FIfuUdXth8ijTh,I have used tidymodels packages many times,I work in industry,Q5_4,0,Probability threshold optimization,NA
+R_3FIfuUdXth8ijTh,I have used tidymodels packages many times,I work in industry,Q5_5,0,Spatial analysis models and methods,NA
+R_3FIfuUdXth8ijTh,I have used tidymodels packages many times,I work in industry,Q5_6,20,Better serialization tools ,NA
+R_3FIfuUdXth8ijTh,I have used tidymodels packages many times,I work in industry,Q5_10,40,H2O.ai support ,NA
+R_3FIfuUdXth8ijTh,I have used tidymodels packages many times,I work in industry,Q5_12,0,Other,NA
+R_3HYwVro7XfbeLNm,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_1,0,Model fairness analysis and metrics,NA
+R_3HYwVro7XfbeLNm,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_2,0,Supervised feature selection,NA
+R_3HYwVro7XfbeLNm,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_3,10,Probability calibration (post modeling),NA
+R_3HYwVro7XfbeLNm,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_4,10,Probability threshold optimization,NA
+R_3HYwVro7XfbeLNm,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_5,20,Spatial analysis models and methods,NA
+R_3HYwVro7XfbeLNm,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_6,0,Better serialization tools ,NA
+R_3HYwVro7XfbeLNm,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_10,60,H2O.ai support ,NA
+R_3HYwVro7XfbeLNm,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_12,0,Other,NA
+R_25zQTJrlL4B77m8,I have used tidymodels packages a few times,I work in industry,Q5_1,0,Model fairness analysis and metrics,NA
+R_25zQTJrlL4B77m8,I have used tidymodels packages a few times,I work in industry,Q5_2,50,Supervised feature selection,NA
+R_25zQTJrlL4B77m8,I have used tidymodels packages a few times,I work in industry,Q5_3,20,Probability calibration (post modeling),NA
+R_25zQTJrlL4B77m8,I have used tidymodels packages a few times,I work in industry,Q5_4,0,Probability threshold optimization,NA
+R_25zQTJrlL4B77m8,I have used tidymodels packages a few times,I work in industry,Q5_5,0,Spatial analysis models and methods,NA
+R_25zQTJrlL4B77m8,I have used tidymodels packages a few times,I work in industry,Q5_6,0,Better serialization tools ,NA
+R_25zQTJrlL4B77m8,I have used tidymodels packages a few times,I work in industry,Q5_10,30,H2O.ai support ,NA
+R_25zQTJrlL4B77m8,I have used tidymodels packages a few times,I work in industry,Q5_12,0,Other,NA
+R_W8pjv7DtyA7aeaJ,I have used tidymodels packages a few times,I am a student,Q5_1,5,Model fairness analysis and metrics,NA
+R_W8pjv7DtyA7aeaJ,I have used tidymodels packages a few times,I am a student,Q5_2,5,Supervised feature selection,NA
+R_W8pjv7DtyA7aeaJ,I have used tidymodels packages a few times,I am a student,Q5_3,20,Probability calibration (post modeling),NA
+R_W8pjv7DtyA7aeaJ,I have used tidymodels packages a few times,I am a student,Q5_4,5,Probability threshold optimization,NA
+R_W8pjv7DtyA7aeaJ,I have used tidymodels packages a few times,I am a student,Q5_5,30,Spatial analysis models and methods,NA
+R_W8pjv7DtyA7aeaJ,I have used tidymodels packages a few times,I am a student,Q5_6,30,Better serialization tools ,NA
+R_W8pjv7DtyA7aeaJ,I have used tidymodels packages a few times,I am a student,Q5_10,5,H2O.ai support ,NA
+R_W8pjv7DtyA7aeaJ,I have used tidymodels packages a few times,I am a student,Q5_12,0,Other,NA
+R_1FIWIUDymZunGn6,I have used tidymodels packages many times,I work in industry,Q5_1,0,Model fairness analysis and metrics,NA
+R_1FIWIUDymZunGn6,I have used tidymodels packages many times,I work in industry,Q5_2,5,Supervised feature selection,NA
+R_1FIWIUDymZunGn6,I have used tidymodels packages many times,I work in industry,Q5_3,5,Probability calibration (post modeling),NA
+R_1FIWIUDymZunGn6,I have used tidymodels packages many times,I work in industry,Q5_4,0,Probability threshold optimization,NA
+R_1FIWIUDymZunGn6,I have used tidymodels packages many times,I work in industry,Q5_5,75,Spatial analysis models and methods,NA
+R_1FIWIUDymZunGn6,I have used tidymodels packages many times,I work in industry,Q5_6,10,Better serialization tools ,NA
+R_1FIWIUDymZunGn6,I have used tidymodels packages many times,I work in industry,Q5_10,5,H2O.ai support ,NA
+R_1FIWIUDymZunGn6,I have used tidymodels packages many times,I work in industry,Q5_12,0,Other,NA
+R_2waBRE2rp1SIhVO,I have used tidymodels packages a few times,I work in industry,Q5_1,30,Model fairness analysis and metrics,NA
+R_2waBRE2rp1SIhVO,I have used tidymodels packages a few times,I work in industry,Q5_2,40,Supervised feature selection,NA
+R_2waBRE2rp1SIhVO,I have used tidymodels packages a few times,I work in industry,Q5_3,30,Probability calibration (post modeling),NA
+R_2waBRE2rp1SIhVO,I have used tidymodels packages a few times,I work in industry,Q5_4,0,Probability threshold optimization,NA
+R_2waBRE2rp1SIhVO,I have used tidymodels packages a few times,I work in industry,Q5_5,0,Spatial analysis models and methods,NA
+R_2waBRE2rp1SIhVO,I have used tidymodels packages a few times,I work in industry,Q5_6,0,Better serialization tools ,NA
+R_2waBRE2rp1SIhVO,I have used tidymodels packages a few times,I work in industry,Q5_10,0,H2O.ai support ,NA
+R_2waBRE2rp1SIhVO,I have used tidymodels packages a few times,I work in industry,Q5_12,0,Other,NA
+R_1EcXyubMiddz0Z2,I have used tidymodels packages many times,I work in industry,Q5_1,0,Model fairness analysis and metrics,NA
+R_1EcXyubMiddz0Z2,I have used tidymodels packages many times,I work in industry,Q5_2,50,Supervised feature selection,NA
+R_1EcXyubMiddz0Z2,I have used tidymodels packages many times,I work in industry,Q5_3,50,Probability calibration (post modeling),NA
+R_1EcXyubMiddz0Z2,I have used tidymodels packages many times,I work in industry,Q5_4,0,Probability threshold optimization,NA
+R_1EcXyubMiddz0Z2,I have used tidymodels packages many times,I work in industry,Q5_5,0,Spatial analysis models and methods,NA
+R_1EcXyubMiddz0Z2,I have used tidymodels packages many times,I work in industry,Q5_6,0,Better serialization tools ,NA
+R_1EcXyubMiddz0Z2,I have used tidymodels packages many times,I work in industry,Q5_10,0,H2O.ai support ,NA
+R_1EcXyubMiddz0Z2,I have used tidymodels packages many times,I work in industry,Q5_12,0,Other,NA
+R_XjrGnF4ujBGZVId,I have used tidymodels packages many times,I work in industry,Q5_1,2,Model fairness analysis and metrics,NA
+R_XjrGnF4ujBGZVId,I have used tidymodels packages many times,I work in industry,Q5_2,0,Supervised feature selection,NA
+R_XjrGnF4ujBGZVId,I have used tidymodels packages many times,I work in industry,Q5_3,3,Probability calibration (post modeling),NA
+R_XjrGnF4ujBGZVId,I have used tidymodels packages many times,I work in industry,Q5_4,0,Probability threshold optimization,NA
+R_XjrGnF4ujBGZVId,I have used tidymodels packages many times,I work in industry,Q5_5,0,Spatial analysis models and methods,NA
+R_XjrGnF4ujBGZVId,I have used tidymodels packages many times,I work in industry,Q5_6,0,Better serialization tools ,NA
+R_XjrGnF4ujBGZVId,I have used tidymodels packages many times,I work in industry,Q5_10,5,H2O.ai support ,NA
+R_XjrGnF4ujBGZVId,I have used tidymodels packages many times,I work in industry,Q5_12,90,Other,Ability to pause / recover or modify an hyper-parameters training without starting from scratch
+R_1g7q1HCKslH5GVQ,I have used tidymodels packages a few times,I work in industry,Q5_1,0,Model fairness analysis and metrics,NA
+R_1g7q1HCKslH5GVQ,I have used tidymodels packages a few times,I work in industry,Q5_2,0,Supervised feature selection,NA
+R_1g7q1HCKslH5GVQ,I have used tidymodels packages a few times,I work in industry,Q5_3,0,Probability calibration (post modeling),NA
+R_1g7q1HCKslH5GVQ,I have used tidymodels packages a few times,I work in industry,Q5_4,0,Probability threshold optimization,NA
+R_1g7q1HCKslH5GVQ,I have used tidymodels packages a few times,I work in industry,Q5_5,0,Spatial analysis models and methods,NA
+R_1g7q1HCKslH5GVQ,I have used tidymodels packages a few times,I work in industry,Q5_6,0,Better serialization tools ,NA
+R_1g7q1HCKslH5GVQ,I have used tidymodels packages a few times,I work in industry,Q5_10,0,H2O.ai support ,NA
+R_1g7q1HCKslH5GVQ,I have used tidymodels packages a few times,I work in industry,Q5_12,100,Other,Cheatsheets
+R_2c2zQEhWMjtJMMW,I have used tidymodels packages a few times,I work in industry,Q5_1,30,Model fairness analysis and metrics,NA
+R_2c2zQEhWMjtJMMW,I have used tidymodels packages a few times,I work in industry,Q5_2,30,Supervised feature selection,NA
+R_2c2zQEhWMjtJMMW,I have used tidymodels packages a few times,I work in industry,Q5_3,0,Probability calibration (post modeling),NA
+R_2c2zQEhWMjtJMMW,I have used tidymodels packages a few times,I work in industry,Q5_4,40,Probability threshold optimization,NA
+R_2c2zQEhWMjtJMMW,I have used tidymodels packages a few times,I work in industry,Q5_5,0,Spatial analysis models and methods,NA
+R_2c2zQEhWMjtJMMW,I have used tidymodels packages a few times,I work in industry,Q5_6,0,Better serialization tools ,NA
+R_2c2zQEhWMjtJMMW,I have used tidymodels packages a few times,I work in industry,Q5_10,0,H2O.ai support ,NA
+R_2c2zQEhWMjtJMMW,I have used tidymodels packages a few times,I work in industry,Q5_12,0,Other,NA
+R_3sb6hLn8FelF8NR,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_1,35,Model fairness analysis and metrics,NA
+R_3sb6hLn8FelF8NR,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_2,30,Supervised feature selection,NA
+R_3sb6hLn8FelF8NR,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_3,0,Probability calibration (post modeling),NA
+R_3sb6hLn8FelF8NR,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_4,0,Probability threshold optimization,NA
+R_3sb6hLn8FelF8NR,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_5,35,Spatial analysis models and methods,NA
+R_3sb6hLn8FelF8NR,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_6,0,Better serialization tools ,NA
+R_3sb6hLn8FelF8NR,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_10,0,H2O.ai support ,NA
+R_3sb6hLn8FelF8NR,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_12,0,Other,NA
+R_2y4mi7Sivq9uDR0,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_1,10,Model fairness analysis and metrics,NA
+R_2y4mi7Sivq9uDR0,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_2,10,Supervised feature selection,NA
+R_2y4mi7Sivq9uDR0,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_3,0,Probability calibration (post modeling),NA
+R_2y4mi7Sivq9uDR0,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_4,10,Probability threshold optimization,NA
+R_2y4mi7Sivq9uDR0,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_5,50,Spatial analysis models and methods,NA
+R_2y4mi7Sivq9uDR0,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_6,20,Better serialization tools ,NA
+R_2y4mi7Sivq9uDR0,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_10,0,H2O.ai support ,NA
+R_2y4mi7Sivq9uDR0,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_12,0,Other,NA
+R_1qdEUw6nOEXZkyt,I have contributed to tidymodels packages or taught others how to use them,"I am an academic, professor, and/or researcher",Q5_1,0,Model fairness analysis and metrics,NA
+R_1qdEUw6nOEXZkyt,I have contributed to tidymodels packages or taught others how to use them,"I am an academic, professor, and/or researcher",Q5_2,0,Supervised feature selection,NA
+R_1qdEUw6nOEXZkyt,I have contributed to tidymodels packages or taught others how to use them,"I am an academic, professor, and/or researcher",Q5_3,0,Probability calibration (post modeling),NA
+R_1qdEUw6nOEXZkyt,I have contributed to tidymodels packages or taught others how to use them,"I am an academic, professor, and/or researcher",Q5_4,25,Probability threshold optimization,NA
+R_1qdEUw6nOEXZkyt,I have contributed to tidymodels packages or taught others how to use them,"I am an academic, professor, and/or researcher",Q5_5,0,Spatial analysis models and methods,NA
+R_1qdEUw6nOEXZkyt,I have contributed to tidymodels packages or taught others how to use them,"I am an academic, professor, and/or researcher",Q5_6,0,Better serialization tools ,NA
+R_1qdEUw6nOEXZkyt,I have contributed to tidymodels packages or taught others how to use them,"I am an academic, professor, and/or researcher",Q5_10,0,H2O.ai support ,NA
+R_1qdEUw6nOEXZkyt,I have contributed to tidymodels packages or taught others how to use them,"I am an academic, professor, and/or researcher",Q5_12,75,Other,nested cross-validation
+R_yxu3o71U1LuQS41,I have used tidymodels packages a few times,I work in industry,Q5_1,0,Model fairness analysis and metrics,NA
+R_yxu3o71U1LuQS41,I have used tidymodels packages a few times,I work in industry,Q5_2,0,Supervised feature selection,NA
+R_yxu3o71U1LuQS41,I have used tidymodels packages a few times,I work in industry,Q5_3,10,Probability calibration (post modeling),NA
+R_yxu3o71U1LuQS41,I have used tidymodels packages a few times,I work in industry,Q5_4,0,Probability threshold optimization,NA
+R_yxu3o71U1LuQS41,I have used tidymodels packages a few times,I work in industry,Q5_5,0,Spatial analysis models and methods,NA
+R_yxu3o71U1LuQS41,I have used tidymodels packages a few times,I work in industry,Q5_6,0,Better serialization tools ,NA
+R_yxu3o71U1LuQS41,I have used tidymodels packages a few times,I work in industry,Q5_10,0,H2O.ai support ,NA
+R_yxu3o71U1LuQS41,I have used tidymodels packages a few times,I work in industry,Q5_12,90,Other,Stable API / framework
+R_d0SnY6NJAh0wEil,I have used tidymodels packages many times,I work in industry,Q5_1,33.3,Model fairness analysis and metrics,NA
+R_d0SnY6NJAh0wEil,I have used tidymodels packages many times,I work in industry,Q5_2,0,Supervised feature selection,NA
+R_d0SnY6NJAh0wEil,I have used tidymodels packages many times,I work in industry,Q5_3,0,Probability calibration (post modeling),NA
+R_d0SnY6NJAh0wEil,I have used tidymodels packages many times,I work in industry,Q5_4,33.3,Probability threshold optimization,NA
+R_d0SnY6NJAh0wEil,I have used tidymodels packages many times,I work in industry,Q5_5,0,Spatial analysis models and methods,NA
+R_d0SnY6NJAh0wEil,I have used tidymodels packages many times,I work in industry,Q5_6,0,Better serialization tools ,NA
+R_d0SnY6NJAh0wEil,I have used tidymodels packages many times,I work in industry,Q5_10,0,H2O.ai support ,NA
+R_d0SnY6NJAh0wEil,I have used tidymodels packages many times,I work in industry,Q5_12,33.4,Other,Explainability (related to fairness)
+R_1DN1KuKHUaMV7WY,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_1,20,Model fairness analysis and metrics,NA
+R_1DN1KuKHUaMV7WY,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_2,20,Supervised feature selection,NA
+R_1DN1KuKHUaMV7WY,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_3,20,Probability calibration (post modeling),NA
+R_1DN1KuKHUaMV7WY,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_4,20,Probability threshold optimization,NA
+R_1DN1KuKHUaMV7WY,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_5,0,Spatial analysis models and methods,NA
+R_1DN1KuKHUaMV7WY,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_6,0,Better serialization tools ,NA
+R_1DN1KuKHUaMV7WY,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_10,20,H2O.ai support ,NA
+R_1DN1KuKHUaMV7WY,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_12,0,Other,NA
+R_ZHKGGPAyevwQSn7,I have used tidymodels packages a few times,I work in industry,Q5_1,70,Model fairness analysis and metrics,NA
+R_ZHKGGPAyevwQSn7,I have used tidymodels packages a few times,I work in industry,Q5_2,30,Supervised feature selection,NA
+R_ZHKGGPAyevwQSn7,I have used tidymodels packages a few times,I work in industry,Q5_3,0,Probability calibration (post modeling),NA
+R_ZHKGGPAyevwQSn7,I have used tidymodels packages a few times,I work in industry,Q5_4,0,Probability threshold optimization,NA
+R_ZHKGGPAyevwQSn7,I have used tidymodels packages a few times,I work in industry,Q5_5,0,Spatial analysis models and methods,NA
+R_ZHKGGPAyevwQSn7,I have used tidymodels packages a few times,I work in industry,Q5_6,0,Better serialization tools ,NA
+R_ZHKGGPAyevwQSn7,I have used tidymodels packages a few times,I work in industry,Q5_10,0,H2O.ai support ,NA
+R_ZHKGGPAyevwQSn7,I have used tidymodels packages a few times,I work in industry,Q5_12,0,Other,NA
+R_2aLIFXsowIyWe1X,I have used tidymodels packages a few times,I work in industry,Q5_1,0,Model fairness analysis and metrics,NA
+R_2aLIFXsowIyWe1X,I have used tidymodels packages a few times,I work in industry,Q5_2,10,Supervised feature selection,NA
+R_2aLIFXsowIyWe1X,I have used tidymodels packages a few times,I work in industry,Q5_3,20,Probability calibration (post modeling),NA
+R_2aLIFXsowIyWe1X,I have used tidymodels packages a few times,I work in industry,Q5_4,10,Probability threshold optimization,NA
+R_2aLIFXsowIyWe1X,I have used tidymodels packages a few times,I work in industry,Q5_5,0,Spatial analysis models and methods,NA
+R_2aLIFXsowIyWe1X,I have used tidymodels packages a few times,I work in industry,Q5_6,20,Better serialization tools ,NA
+R_2aLIFXsowIyWe1X,I have used tidymodels packages a few times,I work in industry,Q5_10,40,H2O.ai support ,NA
+R_2aLIFXsowIyWe1X,I have used tidymodels packages a few times,I work in industry,Q5_12,0,Other,NA
+R_1JXZyc0zm7DrcWy,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_1,0,Model fairness analysis and metrics,NA
+R_1JXZyc0zm7DrcWy,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_2,0,Supervised feature selection,NA
+R_1JXZyc0zm7DrcWy,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_3,1,Probability calibration (post modeling),NA
+R_1JXZyc0zm7DrcWy,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_4,0,Probability threshold optimization,NA
+R_1JXZyc0zm7DrcWy,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_5,0,Spatial analysis models and methods,NA
+R_1JXZyc0zm7DrcWy,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_6,0,Better serialization tools ,NA
+R_1JXZyc0zm7DrcWy,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_10,0,H2O.ai support ,NA
+R_1JXZyc0zm7DrcWy,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_12,99,Other,case weight support
+R_1pmTChlKLxNlJzG,I have used tidymodels packages many times,I work in industry,Q5_1,50,Model fairness analysis and metrics,NA
+R_1pmTChlKLxNlJzG,I have used tidymodels packages many times,I work in industry,Q5_2,50,Supervised feature selection,NA
+R_1pmTChlKLxNlJzG,I have used tidymodels packages many times,I work in industry,Q5_3,0,Probability calibration (post modeling),NA
+R_1pmTChlKLxNlJzG,I have used tidymodels packages many times,I work in industry,Q5_4,0,Probability threshold optimization,NA
+R_1pmTChlKLxNlJzG,I have used tidymodels packages many times,I work in industry,Q5_5,0,Spatial analysis models and methods,NA
+R_1pmTChlKLxNlJzG,I have used tidymodels packages many times,I work in industry,Q5_6,0,Better serialization tools ,NA
+R_1pmTChlKLxNlJzG,I have used tidymodels packages many times,I work in industry,Q5_10,0,H2O.ai support ,NA
+R_1pmTChlKLxNlJzG,I have used tidymodels packages many times,I work in industry,Q5_12,0,Other,NA
+R_CmOLQPV884kG5Nf,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_1,0,Model fairness analysis and metrics,NA
+R_CmOLQPV884kG5Nf,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_2,20,Supervised feature selection,NA
+R_CmOLQPV884kG5Nf,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_3,0,Probability calibration (post modeling),NA
+R_CmOLQPV884kG5Nf,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_4,20,Probability threshold optimization,NA
+R_CmOLQPV884kG5Nf,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_5,0,Spatial analysis models and methods,NA
+R_CmOLQPV884kG5Nf,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_6,0,Better serialization tools ,NA
+R_CmOLQPV884kG5Nf,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_10,20,H2O.ai support ,NA
+R_CmOLQPV884kG5Nf,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_12,40,Other,Survival Analysis
+R_1goNCPhScobZQdC,I have used tidymodels packages many times,I work in industry,Q5_1,30,Model fairness analysis and metrics,NA
+R_1goNCPhScobZQdC,I have used tidymodels packages many times,I work in industry,Q5_2,30,Supervised feature selection,NA
+R_1goNCPhScobZQdC,I have used tidymodels packages many times,I work in industry,Q5_3,20,Probability calibration (post modeling),NA
+R_1goNCPhScobZQdC,I have used tidymodels packages many times,I work in industry,Q5_4,20,Probability threshold optimization,NA
+R_1goNCPhScobZQdC,I have used tidymodels packages many times,I work in industry,Q5_5,0,Spatial analysis models and methods,NA
+R_1goNCPhScobZQdC,I have used tidymodels packages many times,I work in industry,Q5_6,0,Better serialization tools ,NA
+R_1goNCPhScobZQdC,I have used tidymodels packages many times,I work in industry,Q5_10,0,H2O.ai support ,NA
+R_1goNCPhScobZQdC,I have used tidymodels packages many times,I work in industry,Q5_12,0,Other,NA
+R_2TGfYy52pxwXCSX,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_1,10,Model fairness analysis and metrics,NA
+R_2TGfYy52pxwXCSX,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_2,40,Supervised feature selection,NA
+R_2TGfYy52pxwXCSX,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_3,0,Probability calibration (post modeling),NA
+R_2TGfYy52pxwXCSX,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_4,0,Probability threshold optimization,NA
+R_2TGfYy52pxwXCSX,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_5,30,Spatial analysis models and methods,NA
+R_2TGfYy52pxwXCSX,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_6,20,Better serialization tools ,NA
+R_2TGfYy52pxwXCSX,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_10,0,H2O.ai support ,NA
+R_2TGfYy52pxwXCSX,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_12,0,Other,NA
+R_Tj7jjQoPdgWcHjH,I have used tidymodels packages a few times,I work in industry,Q5_1,30,Model fairness analysis and metrics,NA
+R_Tj7jjQoPdgWcHjH,I have used tidymodels packages a few times,I work in industry,Q5_2,3,Supervised feature selection,NA
+R_Tj7jjQoPdgWcHjH,I have used tidymodels packages a few times,I work in industry,Q5_3,30,Probability calibration (post modeling),NA
+R_Tj7jjQoPdgWcHjH,I have used tidymodels packages a few times,I work in industry,Q5_4,7,Probability threshold optimization,NA
+R_Tj7jjQoPdgWcHjH,I have used tidymodels packages a few times,I work in industry,Q5_5,20,Spatial analysis models and methods,NA
+R_Tj7jjQoPdgWcHjH,I have used tidymodels packages a few times,I work in industry,Q5_6,0,Better serialization tools ,NA
+R_Tj7jjQoPdgWcHjH,I have used tidymodels packages a few times,I work in industry,Q5_10,10,H2O.ai support ,NA
+R_Tj7jjQoPdgWcHjH,I have used tidymodels packages a few times,I work in industry,Q5_12,0,Other,NA
+R_29uECNvARvFKGIc,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_1,45,Model fairness analysis and metrics,NA
+R_29uECNvARvFKGIc,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_2,45,Supervised feature selection,NA
+R_29uECNvARvFKGIc,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_3,0,Probability calibration (post modeling),NA
+R_29uECNvARvFKGIc,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_4,0,Probability threshold optimization,NA
+R_29uECNvARvFKGIc,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_5,10,Spatial analysis models and methods,NA
+R_29uECNvARvFKGIc,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_6,0,Better serialization tools ,NA
+R_29uECNvARvFKGIc,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_10,0,H2O.ai support ,NA
+R_29uECNvARvFKGIc,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_12,0,Other,NA
+R_3CKqORdwvRXetOK,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_1,40,Model fairness analysis and metrics,NA
+R_3CKqORdwvRXetOK,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_2,40,Supervised feature selection,NA
+R_3CKqORdwvRXetOK,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_3,0,Probability calibration (post modeling),NA
+R_3CKqORdwvRXetOK,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_4,20,Probability threshold optimization,NA
+R_3CKqORdwvRXetOK,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_5,0,Spatial analysis models and methods,NA
+R_3CKqORdwvRXetOK,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_6,0,Better serialization tools ,NA
+R_3CKqORdwvRXetOK,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_10,0,H2O.ai support ,NA
+R_3CKqORdwvRXetOK,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_12,0,Other,NA
+R_2YG75HfvtJVuBMX,I have used tidymodels packages many times,I work in industry,Q5_1,10,Model fairness analysis and metrics,NA
+R_2YG75HfvtJVuBMX,I have used tidymodels packages many times,I work in industry,Q5_2,10,Supervised feature selection,NA
+R_2YG75HfvtJVuBMX,I have used tidymodels packages many times,I work in industry,Q5_3,30,Probability calibration (post modeling),NA
+R_2YG75HfvtJVuBMX,I have used tidymodels packages many times,I work in industry,Q5_4,10,Probability threshold optimization,NA
+R_2YG75HfvtJVuBMX,I have used tidymodels packages many times,I work in industry,Q5_5,10,Spatial analysis models and methods,NA
+R_2YG75HfvtJVuBMX,I have used tidymodels packages many times,I work in industry,Q5_6,20,Better serialization tools ,NA
+R_2YG75HfvtJVuBMX,I have used tidymodels packages many times,I work in industry,Q5_10,10,H2O.ai support ,NA
+R_2YG75HfvtJVuBMX,I have used tidymodels packages many times,I work in industry,Q5_12,0,Other,NA
+R_33x4zxZqAB7mkYT,I have used tidymodels packages a few times,I work in industry,Q5_1,0,Model fairness analysis and metrics,NA
+R_33x4zxZqAB7mkYT,I have used tidymodels packages a few times,I work in industry,Q5_2,10,Supervised feature selection,NA
+R_33x4zxZqAB7mkYT,I have used tidymodels packages a few times,I work in industry,Q5_3,0,Probability calibration (post modeling),NA
+R_33x4zxZqAB7mkYT,I have used tidymodels packages a few times,I work in industry,Q5_4,0,Probability threshold optimization,NA
+R_33x4zxZqAB7mkYT,I have used tidymodels packages a few times,I work in industry,Q5_5,0,Spatial analysis models and methods,NA
+R_33x4zxZqAB7mkYT,I have used tidymodels packages a few times,I work in industry,Q5_6,10,Better serialization tools ,NA
+R_33x4zxZqAB7mkYT,I have used tidymodels packages a few times,I work in industry,Q5_10,40,H2O.ai support ,NA
+R_33x4zxZqAB7mkYT,I have used tidymodels packages a few times,I work in industry,Q5_12,40,Other,observation weight specification
+R_2lgpHgfrx6KivYt,I have used tidymodels packages a few times,I am a student,Q5_1,10,Model fairness analysis and metrics,NA
+R_2lgpHgfrx6KivYt,I have used tidymodels packages a few times,I am a student,Q5_2,40,Supervised feature selection,NA
+R_2lgpHgfrx6KivYt,I have used tidymodels packages a few times,I am a student,Q5_3,20,Probability calibration (post modeling),NA
+R_2lgpHgfrx6KivYt,I have used tidymodels packages a few times,I am a student,Q5_4,10,Probability threshold optimization,NA
+R_2lgpHgfrx6KivYt,I have used tidymodels packages a few times,I am a student,Q5_5,0,Spatial analysis models and methods,NA
+R_2lgpHgfrx6KivYt,I have used tidymodels packages a few times,I am a student,Q5_6,10,Better serialization tools ,NA
+R_2lgpHgfrx6KivYt,I have used tidymodels packages a few times,I am a student,Q5_10,10,H2O.ai support ,NA
+R_2lgpHgfrx6KivYt,I have used tidymodels packages a few times,I am a student,Q5_12,0,Other,NA
+R_1r98cUuY2OVp4uS,I have used tidymodels packages a few times,I am a student,Q5_1,15,Model fairness analysis and metrics,NA
+R_1r98cUuY2OVp4uS,I have used tidymodels packages a few times,I am a student,Q5_2,10,Supervised feature selection,NA
+R_1r98cUuY2OVp4uS,I have used tidymodels packages a few times,I am a student,Q5_3,5,Probability calibration (post modeling),NA
+R_1r98cUuY2OVp4uS,I have used tidymodels packages a few times,I am a student,Q5_4,5,Probability threshold optimization,NA
+R_1r98cUuY2OVp4uS,I have used tidymodels packages a few times,I am a student,Q5_5,30,Spatial analysis models and methods,NA
+R_1r98cUuY2OVp4uS,I have used tidymodels packages a few times,I am a student,Q5_6,15,Better serialization tools ,NA
+R_1r98cUuY2OVp4uS,I have used tidymodels packages a few times,I am a student,Q5_10,0,H2O.ai support ,NA
+R_1r98cUuY2OVp4uS,I have used tidymodels packages a few times,I am a student,Q5_12,20,Other,More support for text data
diff --git a/about/surveys/priorities-2024/index.Rmd b/about/surveys/priorities-2024/index.Rmd
new file mode 100644
index 00000000..7eae02a3
--- /dev/null
+++ b/about/surveys/priorities-2024/index.Rmd
@@ -0,0 +1,311 @@
+---
+title: "Priorities for tidymodels 2024"
+author: "Julia Silge"
+date: '`r Sys.Date()`'
+output:
+ html_document:
+ theme: yeti
+ toc: true
+ toc_float: true
+ code_folding: hide
+---
+
+```{r setup, include=FALSE}
+library(knitr)
+knitr::opts_chunk$set(cache = TRUE, warning = FALSE,
+ message = FALSE, echo = TRUE,
+ dpi = 300,
+ fig.width = 8, fig.height = 5)
+library(tidyverse)
+library(silgelib)
+library(scales)
+
+theme_transparent <- function(...) {
+
+ ret <- ggplot2::theme_minimal(...)
+
+ trans_rect <- ggplot2::element_rect(fill = "transparent", colour = NA)
+ ret$panel.background <- trans_rect
+ ret$plot.background <- trans_rect
+ ret$legend.background <- trans_rect
+ ret$legend.key <- trans_rect
+
+ ret
+}
+
+theme_set(theme_plex())
+##theme_set(theme_transparent())
+update_geom_defaults("col", list(fill = "#54B5BF"))
+update_stat_defaults("bin", list(fill = "#54B5BF"))
+
+## if you don't have fancy fonts like IBM Plex installed, run
+## theme_set(theme_minimal())
+```
+
+
+The tidymodels team [fielded a short survey](https://www.tidyverse.org/blog/2024/02/tidymodels-2024-survey/) to gather community feedback on development priorities and possible next steps in 2024. This report summarizes the survey results.
+
+## tl;dr
+
+- Almost 340 people responded to the survey (a significant decrease from last year).
+- About half of respondents say they have used tidymodels packages many times.
+- About 60% of respondents say they work in industry.
+- The priority given the most weight by our respondents (across most groups) is by far causal inference.
+- Priorities involving the chattr package, cost-sensitive learning, and sparse tibbles were among the most likely to be given zero weight.
+
+## Exploring the data
+
+Let's start by exploring the characteristics of the survey respondents.
+
+```{r tidy_survey}
+library(tidyverse)
+library(qualtRics)
+library(glue)
+
+survey_id <- "SV_aWw8ocGN5aPgeZE"
+
+survey_raw <- fetch_survey(survey_id, verbose = FALSE, force_request = TRUE) %>%
+ filter(Status != "Survey Preview", Finished)
+
+survey_select <- survey_raw %>%
+ select(Q5_1:Q5_12, Q1002, Q12)
+
+metadata_raw <- metadata(survey_id)
+
+choice_text <- metadata_raw$questions$QID2001$choices %>%
+ map_chr("choiceText")
+
+question_text <- survey_questions(survey_id) %>%
+ filter(qname %in% c("Q1002", "Q12"))
+
+labels_df <-
+ enframe(choice_text) %>%
+ transmute(qname = glue("Q5_{name}"),
+ question = map(value, xml2::read_html)) %>%
+ mutate(question = map(question, xml2::as_list),
+ question = map_chr(question, ~.$html$body$strong[[1]])) %>%
+ bind_rows(question_text)
+
+tidy_survey <- survey_select %>%
+ pivot_longer(Q5_1:Q5_12, names_to = "qname", values_to = "dollars") %>%
+ inner_join(labels_df) %>%
+ select(-qid, -force_resp) %>%
+ filter(question != "Other")
+
+survey_raw %>%
+ count(StartDate = as.Date(StartDate)) %>%
+ ggplot(aes(StartDate, n)) +
+ geom_col(alpha = 0.8) +
+ labs(x = NULL,
+ y = "Number of survey responses",
+ title = "Survey responses over time",
+ subtitle = glue("There are ", {nrow(survey_raw)}, " total responses"))
+
+survey_raw %>%
+ mutate(Q1002 = fct_relabel(Q1002, str_wrap, width = 20)) %>%
+ count(Q1002) %>%
+ ggplot(aes(x = n, y = Q1002)) +
+ geom_col(alpha = 0.8) +
+ scale_x_continuous(expand = c(0,0)) +
+ labs(x = "Number of survey responses",
+ y = NULL,
+ title = "Familiarity with tidymodels",
+ subtitle = glue("Of the respondents, ",
+ {percent(mean(str_detect(survey_raw$Q1002, "many times")))},
+ " say they have used tidymodels many times"))
+
+survey_raw %>%
+ filter(`Duration (in seconds)` < 5e4) %>%
+ mutate(Q1002 = fct_relabel(Q1002, str_wrap, width = 20)) %>%
+ ggplot(aes(Q1002, `Duration (in seconds)`, fill = Q1002)) +
+ geom_boxplot(show.legend = FALSE, alpha = 0.7) +
+ scale_y_log10() +
+ labs(x = NULL,
+ y = "Time to take the survey (seconds)",
+ title = "Survey length in seconds",
+ subtitle = glue(
+ "The median time to take the survey was ",
+ {round(median(survey_raw$`Duration (in seconds)`) / 60, 2)},
+ " minutes")
+ )
+
+survey_raw %>%
+ mutate(Q12 = fct_relabel(Q12, str_wrap, width = 20)) %>%
+ count(Q12) %>%
+ ggplot(aes(x = n, y = Q12)) +
+ geom_col(alpha = 0.8) +
+ scale_x_continuous(expand = c(0,0)) +
+ labs(x = "Number of survey responses",
+ y = NULL,
+ title = "Current role",
+ subtitle = glue("Of the respondents, ",
+ {percent(mean(str_detect(survey_raw$Q12, "in industry")))},
+ " say they work in industry"))
+```
+
+
+## Perspectives on priorities
+
+The main question on the survey asked:
+
+> If you had a hypothetical $100 to spend on tidymodels development, how would you allocate those resources right now?
+
+The possible priorities were presented in a randomized order to respondents, except for the "Other" option at the bottom.
+
+## Mean dollars allocated {.tabset}
+
+### Overall
+
+```{r mean_all, dependson="tidy_survey", fig.width=9, fig.height=6}
+tidy_survey %>%
+ mutate(question = str_wrap(question, width = 25)) %>%
+ group_by(question) %>%
+ summarise(dollars_mean = mean(dollars)) %>%
+ mutate(question = fct_reorder(question, dollars_mean)) %>%
+ ggplot(aes(dollars_mean, question)) +
+ geom_col(alpha = 0.8) +
+ scale_x_continuous(labels = dollar_format(),
+ expand = c(0,0)) +
+ labs(x = "Mean hypothetical dollars allocated",
+ y = NULL,
+ title = "What are the average dollars allocated to each priority?",
+ subtitle = "Causal inference had by far the highest mean scores")
+```
+
+### By experience
+
+```{r mean_exp, dependson="tidy_survey", fig.width=10, fig.height=9}
+library(tidytext)
+
+tidy_survey %>%
+ mutate(question = str_wrap(question, width = 25),
+ Q1002 = fct_relabel(Q1002, str_wrap, width = 50)) %>%
+ group_by(Q1002, question) %>%
+ summarise(dollars_mean = mean(dollars)) %>%
+ ungroup %>%
+ mutate(question = reorder_within(question, dollars_mean, as.character(Q1002))) %>%
+ ggplot(aes(dollars_mean, question, fill = Q1002)) +
+ geom_col(alpha = 0.8, show.legend = FALSE) +
+ facet_wrap(~Q1002, scales = "free_y") +
+ scale_x_continuous(labels = dollar_format(),
+ expand = c(0,0)) +
+ scale_y_reordered() +
+ labs(x = "Mean hypothetical dollars allocated",
+ y = NULL,
+ title = "What are the average dollars allocated to each priority?",
+ subtitle = "Folks who have contributed to or taught tidymodels prefer causal inference less")
+```
+
+### By role
+
+```{r mean_role, dependson="tidy_survey", fig.width=10, fig.height=9}
+tidy_survey %>%
+ mutate(question = str_wrap(question, width = 25),
+ Q12 = fct_relabel(Q12, str_wrap, width = 40)) %>%
+ group_by(Q12, question) %>%
+ summarise(dollars_mean = mean(dollars)) %>%
+ ungroup %>%
+ mutate(question = reorder_within(question, dollars_mean, as.character(Q12))) %>%
+ ggplot(aes(dollars_mean, question, fill = Q12)) +
+ geom_col(alpha = 0.8, show.legend = FALSE) +
+ facet_wrap(~Q12, scales = "free_y") +
+ scale_x_continuous(labels = dollar_format(),
+ expand = c(0,0)) +
+ scale_y_reordered() +
+ labs(x = "Mean hypothetical dollars allocated",
+ y = NULL,
+ title = "What are the average dollars allocated to each priority?",
+ subtitle = "Causal inference had the highest mean score for most groups")
+```
+
+
+## Don't spend it all in one place 💵
+
+How many people gave their entire $100 to one priority? Very few:
+
+```{r dependson="tidy_survey"}
+tidy_survey %>%
+ filter(dollars > 99) %>%
+ count(question, sort = TRUE) %>%
+ kable(col.names = c("Priority", "Number of respondents allocating *all*"))
+```
+
+## Priorities least likely to be chosen {.tabset}
+
+What priorities were people more likely to allocate $0 to?
+
+### Overall
+
+```{r none_all, dependson="tidy_survey", fig.width=9, fig.height=6}
+tidy_survey %>%
+ mutate(question = str_wrap(question, width = 25)) %>%
+ group_by(question) %>%
+ summarise(none = sum(dollars < 1)) %>%
+ ggplot(aes(none, fct_reorder(question, none))) +
+ geom_col(alpha = 0.8) +
+ scale_x_continuous(expand = c(0,0)) +
+ labs(x = "Number of people who allocated nothing",
+ y = NULL,
+ title = "Which priorities were chosen least often?",
+ subtitle = "The chattr package was chosen less often")
+```
+
+### By experience
+
+```{r none_exp, dependson="tidy_survey", fig.width=10, fig.height=9}
+tidy_survey %>%
+ mutate(question = str_wrap(question, width = 25),
+ Q1002 = fct_relabel(Q1002, str_wrap, width = 50)) %>%
+ group_by(Q1002, question) %>%
+ summarise(none = sum(dollars < 1)) %>%
+ ungroup %>%
+ mutate(question = reorder_within(question, none, as.character(Q1002))) %>%
+ ggplot(aes(none, question, fill = Q1002)) +
+ geom_col(alpha = 0.8, show.legend = FALSE) +
+ facet_wrap(~Q1002, scales = "free") +
+ scale_x_continuous(expand = c(0,0)) +
+ scale_y_reordered() +
+ labs(x = "Number of people who allocated nothing",
+ y = NULL,
+ title = "Which priorities were chosen least often?",
+ subtitle = "The group that has never used tidymodels is the most different")
+```
+
+### By role
+
+```{r none_role, dependson="tidy_survey", fig.width=10, fig.height=9}
+tidy_survey %>%
+ mutate(question = str_wrap(question, width = 25),
+ Q12 = fct_relabel(Q12, str_wrap, width = 40)) %>%
+ group_by(Q12, question) %>%
+ summarise(none = sum(dollars < 1)) %>%
+ ungroup %>%
+ mutate(question = reorder_within(question, none, as.character(Q12))) %>%
+ ggplot(aes(none, question, fill = Q12)) +
+ geom_col(alpha = 0.8, show.legend = FALSE) +
+ facet_wrap(~Q12, scales = "free") +
+ scale_x_continuous(expand = c(0,0)) +
+ scale_y_reordered() +
+ labs(x = "Number of people who allocated nothing",
+ y = NULL,
+ title = "Which priorities were chosen least often?",
+ subtitle = "The chattr package is least chosen for all groups")
+```
+
+
+## Other answers
+
+We offered respondents the opportunity to give us their own ideas for priorities as well. What kinds of options did respondents suggest?
+
+```{r dependson="tidy_survey"}
+library(DT)
+survey_raw %>%
+ filter(!is.na(Q5_12_TEXT)) %>%
+ arrange(Q1002) %>%
+ select(Q1002, Q5_12_TEXT) %>%
+ datatable(colnames = c("Familiarity with tidymodels",
+ "Suggested priority"),
+ options = list(pageLength = 25))
+```
+
+
diff --git a/about/surveys/priorities-2024/index.html b/about/surveys/priorities-2024/index.html
new file mode 100644
index 00000000..7526e5e4
--- /dev/null
+++ b/about/surveys/priorities-2024/index.html
@@ -0,0 +1,4491 @@
+
+
+
+
+
+
+
+
+
+
+
+
+
+
+
+Priorities for tidymodels 2024
+
+
+
+
+
+
+
+
+
+
+
+
+
+
+
+
+
+
+
+
+
+
+
+
+
+
+
+
+
+
+
+
+
+
+
+
+
+
+
+
+
+
+
+
+
+
+
+
+
+
+
+
+
+
+
+
+
+
+
+
+
+
The tidymodels team fielded
+a short survey to gather community feedback on development
+priorities and possible next steps in 2024. This report summarizes the
+survey results.
+
+
tl;dr
+
+
Almost 340 people responded to the survey (a significant decrease
+from last year).
+
About half of respondents say they have used tidymodels packages
+many times.
+
About 60% of respondents say they work in industry.
+
The priority given the most weight by our respondents (across most
+groups) is by far causal inference.
+
Priorities involving the chattr package, cost-sensitive learning,
+and sparse tibbles were among the most likely to be given zero
+weight.
+
+
+
+
Exploring the data
+
Let’s start by exploring the characteristics of the survey
+respondents.
survey_raw %>%
+ mutate(Q1002 = fct_relabel(Q1002, str_wrap, width = 20)) %>%
+ count(Q1002) %>%
+ ggplot(aes(x = n, y = Q1002)) +
+ geom_col(alpha = 0.8) +
+ scale_x_continuous(expand = c(0,0)) +
+ labs(x = "Number of survey responses",
+ y = NULL,
+ title = "Familiarity with tidymodels",
+ subtitle = glue("Of the respondents, ",
+ {percent(mean(str_detect(survey_raw$Q1002, "many times")))},
+ " say they have used tidymodels many times"))
+
+
survey_raw %>%
+ filter(`Duration (in seconds)` < 5e4) %>%
+ mutate(Q1002 = fct_relabel(Q1002, str_wrap, width = 20)) %>%
+ ggplot(aes(Q1002, `Duration (in seconds)`, fill = Q1002)) +
+ geom_boxplot(show.legend = FALSE, alpha = 0.7) +
+ scale_y_log10() +
+ labs(x = NULL,
+ y = "Time to take the survey (seconds)",
+ title = "Survey length in seconds",
+ subtitle = glue(
+ "The median time to take the survey was ",
+ {round(median(survey_raw$`Duration (in seconds)`) / 60, 2)},
+ " minutes")
+ )
+
+
survey_raw %>%
+ mutate(Q12 = fct_relabel(Q12, str_wrap, width = 20)) %>%
+ count(Q12) %>%
+ ggplot(aes(x = n, y = Q12)) +
+ geom_col(alpha = 0.8) +
+ scale_x_continuous(expand = c(0,0)) +
+ labs(x = "Number of survey responses",
+ y = NULL,
+ title = "Current role",
+ subtitle = glue("Of the respondents, ",
+ {percent(mean(str_detect(survey_raw$Q12, "in industry")))},
+ " say they work in industry"))
+
+
+
+
Perspectives on priorities
+
The main question on the survey asked:
+
+
If you had a hypothetical $100 to spend on tidymodels development,
+how would you allocate those resources right now?
+
+
The possible priorities were presented in a randomized order to
+respondents, except for the “Other” option at the bottom.
+
+
+
Mean dollars allocated
+
+
Overall
+
tidy_survey %>%
+ mutate(question = str_wrap(question, width = 25)) %>%
+ group_by(question) %>%
+ summarise(dollars_mean = mean(dollars)) %>%
+ mutate(question = fct_reorder(question, dollars_mean)) %>%
+ ggplot(aes(dollars_mean, question)) +
+ geom_col(alpha = 0.8) +
+ scale_x_continuous(labels = dollar_format(),
+ expand = c(0,0)) +
+ labs(x = "Mean hypothetical dollars allocated",
+ y = NULL,
+ title = "What are the average dollars allocated to each priority?",
+ subtitle = "Causal inference had by far the highest mean scores")
+
+
+
+
By experience
+
library(tidytext)
+
+tidy_survey %>%
+ mutate(question = str_wrap(question, width = 25),
+ Q1002 = fct_relabel(Q1002, str_wrap, width = 50)) %>%
+ group_by(Q1002, question) %>%
+ summarise(dollars_mean = mean(dollars)) %>%
+ ungroup %>%
+ mutate(question = reorder_within(question, dollars_mean, as.character(Q1002))) %>%
+ ggplot(aes(dollars_mean, question, fill = Q1002)) +
+ geom_col(alpha = 0.8, show.legend = FALSE) +
+ facet_wrap(~Q1002, scales = "free_y") +
+ scale_x_continuous(labels = dollar_format(),
+ expand = c(0,0)) +
+ scale_y_reordered() +
+ labs(x = "Mean hypothetical dollars allocated",
+ y = NULL,
+ title = "What are the average dollars allocated to each priority?",
+ subtitle = "Folks who have contributed to or taught tidymodels prefer causal inference less")
+
+
+
+
By role
+
tidy_survey %>%
+ mutate(question = str_wrap(question, width = 25),
+ Q12 = fct_relabel(Q12, str_wrap, width = 40)) %>%
+ group_by(Q12, question) %>%
+ summarise(dollars_mean = mean(dollars)) %>%
+ ungroup %>%
+ mutate(question = reorder_within(question, dollars_mean, as.character(Q12))) %>%
+ ggplot(aes(dollars_mean, question, fill = Q12)) +
+ geom_col(alpha = 0.8, show.legend = FALSE) +
+ facet_wrap(~Q12, scales = "free_y") +
+ scale_x_continuous(labels = dollar_format(),
+ expand = c(0,0)) +
+ scale_y_reordered() +
+ labs(x = "Mean hypothetical dollars allocated",
+ y = NULL,
+ title = "What are the average dollars allocated to each priority?",
+ subtitle = "Causal inference had the highest mean score for most groups")
+
+
+
+
+
Don’t spend it all in one place 💵
+
How many people gave their entire $100 to one priority? Very few:
+
+
+
+
+
+
+
+
+
+
+
+
+
+
+
+
+
diff --git a/about/surveys/priorities-2024/index_files/figure-html/mean_all-1.png b/about/surveys/priorities-2024/index_files/figure-html/mean_all-1.png
new file mode 100644
index 00000000..ce9435c3
Binary files /dev/null and b/about/surveys/priorities-2024/index_files/figure-html/mean_all-1.png differ
diff --git a/about/surveys/priorities-2024/index_files/figure-html/mean_exp-1.png b/about/surveys/priorities-2024/index_files/figure-html/mean_exp-1.png
new file mode 100644
index 00000000..e26de906
Binary files /dev/null and b/about/surveys/priorities-2024/index_files/figure-html/mean_exp-1.png differ
diff --git a/about/surveys/priorities-2024/index_files/figure-html/mean_role-1.png b/about/surveys/priorities-2024/index_files/figure-html/mean_role-1.png
new file mode 100644
index 00000000..67f700d8
Binary files /dev/null and b/about/surveys/priorities-2024/index_files/figure-html/mean_role-1.png differ
diff --git a/about/surveys/priorities-2024/index_files/figure-html/none_all-1.png b/about/surveys/priorities-2024/index_files/figure-html/none_all-1.png
new file mode 100644
index 00000000..7b5727de
Binary files /dev/null and b/about/surveys/priorities-2024/index_files/figure-html/none_all-1.png differ
diff --git a/about/surveys/priorities-2024/index_files/figure-html/none_exp-1.png b/about/surveys/priorities-2024/index_files/figure-html/none_exp-1.png
new file mode 100644
index 00000000..f68b8fd0
Binary files /dev/null and b/about/surveys/priorities-2024/index_files/figure-html/none_exp-1.png differ
diff --git a/about/surveys/priorities-2024/index_files/figure-html/none_role-1.png b/about/surveys/priorities-2024/index_files/figure-html/none_role-1.png
new file mode 100644
index 00000000..5fa06ee5
Binary files /dev/null and b/about/surveys/priorities-2024/index_files/figure-html/none_role-1.png differ
diff --git a/about/surveys/priorities-2024/index_files/figure-html/tidy_survey-1.png b/about/surveys/priorities-2024/index_files/figure-html/tidy_survey-1.png
new file mode 100644
index 00000000..93d52a02
Binary files /dev/null and b/about/surveys/priorities-2024/index_files/figure-html/tidy_survey-1.png differ
diff --git a/about/surveys/priorities-2024/index_files/figure-html/tidy_survey-2.png b/about/surveys/priorities-2024/index_files/figure-html/tidy_survey-2.png
new file mode 100644
index 00000000..ad340c95
Binary files /dev/null and b/about/surveys/priorities-2024/index_files/figure-html/tidy_survey-2.png differ
diff --git a/about/surveys/priorities-2024/index_files/figure-html/tidy_survey-3.png b/about/surveys/priorities-2024/index_files/figure-html/tidy_survey-3.png
new file mode 100644
index 00000000..fac53140
Binary files /dev/null and b/about/surveys/priorities-2024/index_files/figure-html/tidy_survey-3.png differ
diff --git a/about/surveys/priorities-2024/index_files/figure-html/tidy_survey-4.png b/about/surveys/priorities-2024/index_files/figure-html/tidy_survey-4.png
new file mode 100644
index 00000000..ade8523c
Binary files /dev/null and b/about/surveys/priorities-2024/index_files/figure-html/tidy_survey-4.png differ
diff --git a/about/surveys/priorities-2024/results.csv b/about/surveys/priorities-2024/results.csv
new file mode 100644
index 00000000..92011b4b
--- /dev/null
+++ b/about/surveys/priorities-2024/results.csv
@@ -0,0 +1,2689 @@
+ResponseId,Q1002,Q12,qname,dollars,priority,priority_other
+R_58TLEFmeGVVWoZa,I have used tidymodels packages many times,I work in industry,Q5_1,0,Sparse tibbles,NA
+R_58TLEFmeGVVWoZa,I have used tidymodels packages many times,I work in industry,Q5_2,50,Causal inference,NA
+R_58TLEFmeGVVWoZa,I have used tidymodels packages many times,I work in industry,Q5_3,10,Improve chattr,NA
+R_58TLEFmeGVVWoZa,I have used tidymodels packages many times,I work in industry,Q5_4,10,Cost-sensitive learning,NA
+R_58TLEFmeGVVWoZa,I have used tidymodels packages many times,I work in industry,Q5_5,20,Stacking ensembles,NA
+R_58TLEFmeGVVWoZa,I have used tidymodels packages many times,I work in industry,Q5_6,0,Spatial machine learning ,NA
+R_58TLEFmeGVVWoZa,I have used tidymodels packages many times,I work in industry,Q5_10,10,Ordinal regression,NA
+R_58TLEFmeGVVWoZa,I have used tidymodels packages many times,I work in industry,Q5_12,0,Other,NA
+R_6AKKwbysaC7EV8o,I have used tidymodels packages many times,I work in industry,Q5_1,20,Sparse tibbles,NA
+R_6AKKwbysaC7EV8o,I have used tidymodels packages many times,I work in industry,Q5_2,20,Causal inference,NA
+R_6AKKwbysaC7EV8o,I have used tidymodels packages many times,I work in industry,Q5_3,20,Improve chattr,NA
+R_6AKKwbysaC7EV8o,I have used tidymodels packages many times,I work in industry,Q5_4,0,Cost-sensitive learning,NA
+R_6AKKwbysaC7EV8o,I have used tidymodels packages many times,I work in industry,Q5_5,10,Stacking ensembles,NA
+R_6AKKwbysaC7EV8o,I have used tidymodels packages many times,I work in industry,Q5_6,0,Spatial machine learning ,NA
+R_6AKKwbysaC7EV8o,I have used tidymodels packages many times,I work in industry,Q5_10,30,Ordinal regression,NA
+R_6AKKwbysaC7EV8o,I have used tidymodels packages many times,I work in industry,Q5_12,0,Other,NA
+R_7vjxchkKtGeZU6R,I have used tidymodels packages many times,I work in industry,Q5_1,10,Sparse tibbles,NA
+R_7vjxchkKtGeZU6R,I have used tidymodels packages many times,I work in industry,Q5_2,5,Causal inference,NA
+R_7vjxchkKtGeZU6R,I have used tidymodels packages many times,I work in industry,Q5_3,5,Improve chattr,NA
+R_7vjxchkKtGeZU6R,I have used tidymodels packages many times,I work in industry,Q5_4,10,Cost-sensitive learning,NA
+R_7vjxchkKtGeZU6R,I have used tidymodels packages many times,I work in industry,Q5_5,10,Stacking ensembles,NA
+R_7vjxchkKtGeZU6R,I have used tidymodels packages many times,I work in industry,Q5_6,10,Spatial machine learning ,NA
+R_7vjxchkKtGeZU6R,I have used tidymodels packages many times,I work in industry,Q5_10,50,Ordinal regression,NA
+R_7vjxchkKtGeZU6R,I have used tidymodels packages many times,I work in industry,Q5_12,0,Other,NA
+R_2QM3YgHjdPlfLBA,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_1,0,Sparse tibbles,NA
+R_2QM3YgHjdPlfLBA,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_2,0,Causal inference,NA
+R_2QM3YgHjdPlfLBA,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_3,0,Improve chattr,NA
+R_2QM3YgHjdPlfLBA,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_4,50,Cost-sensitive learning,NA
+R_2QM3YgHjdPlfLBA,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_5,0,Stacking ensembles,NA
+R_2QM3YgHjdPlfLBA,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_6,30,Spatial machine learning ,NA
+R_2QM3YgHjdPlfLBA,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_10,20,Ordinal regression,NA
+R_2QM3YgHjdPlfLBA,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_12,0,Other,NA
+R_5pRM01kk1SWm9wJ,I have used tidymodels packages many times,I am a student,Q5_1,0,Sparse tibbles,NA
+R_5pRM01kk1SWm9wJ,I have used tidymodels packages many times,I am a student,Q5_2,0,Causal inference,NA
+R_5pRM01kk1SWm9wJ,I have used tidymodels packages many times,I am a student,Q5_3,40,Improve chattr,NA
+R_5pRM01kk1SWm9wJ,I have used tidymodels packages many times,I am a student,Q5_4,0,Cost-sensitive learning,NA
+R_5pRM01kk1SWm9wJ,I have used tidymodels packages many times,I am a student,Q5_5,60,Stacking ensembles,NA
+R_5pRM01kk1SWm9wJ,I have used tidymodels packages many times,I am a student,Q5_6,0,Spatial machine learning ,NA
+R_5pRM01kk1SWm9wJ,I have used tidymodels packages many times,I am a student,Q5_10,0,Ordinal regression,NA
+R_5pRM01kk1SWm9wJ,I have used tidymodels packages many times,I am a student,Q5_12,0,Other,NA
+R_3ECLbtz51ffWrW9,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_1,0,Sparse tibbles,NA
+R_3ECLbtz51ffWrW9,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_2,0,Causal inference,NA
+R_3ECLbtz51ffWrW9,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_3,0,Improve chattr,NA
+R_3ECLbtz51ffWrW9,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_4,0,Cost-sensitive learning,NA
+R_3ECLbtz51ffWrW9,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_5,0,Stacking ensembles,NA
+R_3ECLbtz51ffWrW9,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_6,0,Spatial machine learning ,NA
+R_3ECLbtz51ffWrW9,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_10,50,Ordinal regression,NA
+R_3ECLbtz51ffWrW9,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_12,50,Other,Multi-label Classification
+R_5oMvSy4888u8UOU,I have used tidymodels packages a few times,I work in industry,Q5_1,0,Sparse tibbles,NA
+R_5oMvSy4888u8UOU,I have used tidymodels packages a few times,I work in industry,Q5_2,0,Causal inference,NA
+R_5oMvSy4888u8UOU,I have used tidymodels packages a few times,I work in industry,Q5_3,40,Improve chattr,NA
+R_5oMvSy4888u8UOU,I have used tidymodels packages a few times,I work in industry,Q5_4,20,Cost-sensitive learning,NA
+R_5oMvSy4888u8UOU,I have used tidymodels packages a few times,I work in industry,Q5_5,20,Stacking ensembles,NA
+R_5oMvSy4888u8UOU,I have used tidymodels packages a few times,I work in industry,Q5_6,20,Spatial machine learning ,NA
+R_5oMvSy4888u8UOU,I have used tidymodels packages a few times,I work in industry,Q5_10,0,Ordinal regression,NA
+R_5oMvSy4888u8UOU,I have used tidymodels packages a few times,I work in industry,Q5_12,0,Other,NA
+R_1Lbc5xNCdJgf397,I have contributed to tidymodels packages or taught others how to use them,"I am an academic, professor, and/or researcher",Q5_1,0,Sparse tibbles,NA
+R_1Lbc5xNCdJgf397,I have contributed to tidymodels packages or taught others how to use them,"I am an academic, professor, and/or researcher",Q5_2,20,Causal inference,NA
+R_1Lbc5xNCdJgf397,I have contributed to tidymodels packages or taught others how to use them,"I am an academic, professor, and/or researcher",Q5_3,0,Improve chattr,NA
+R_1Lbc5xNCdJgf397,I have contributed to tidymodels packages or taught others how to use them,"I am an academic, professor, and/or researcher",Q5_4,30,Cost-sensitive learning,NA
+R_1Lbc5xNCdJgf397,I have contributed to tidymodels packages or taught others how to use them,"I am an academic, professor, and/or researcher",Q5_5,10,Stacking ensembles,NA
+R_1Lbc5xNCdJgf397,I have contributed to tidymodels packages or taught others how to use them,"I am an academic, professor, and/or researcher",Q5_6,0,Spatial machine learning ,NA
+R_1Lbc5xNCdJgf397,I have contributed to tidymodels packages or taught others how to use them,"I am an academic, professor, and/or researcher",Q5_10,0,Ordinal regression,NA
+R_1Lbc5xNCdJgf397,I have contributed to tidymodels packages or taught others how to use them,"I am an academic, professor, and/or researcher",Q5_12,40,Other,CI of performance metrics / Nested CV/XAI
+R_7fuk9vZuyTRUKvn,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_1,25,Sparse tibbles,NA
+R_7fuk9vZuyTRUKvn,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_2,25,Causal inference,NA
+R_7fuk9vZuyTRUKvn,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_3,0,Improve chattr,NA
+R_7fuk9vZuyTRUKvn,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_4,15,Cost-sensitive learning,NA
+R_7fuk9vZuyTRUKvn,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_5,0,Stacking ensembles,NA
+R_7fuk9vZuyTRUKvn,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_6,25,Spatial machine learning ,NA
+R_7fuk9vZuyTRUKvn,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_10,10,Ordinal regression,NA
+R_7fuk9vZuyTRUKvn,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_12,0,Other,NA
+R_2vka0Kl6xAX434t,I have used tidymodels packages many times,I work in industry,Q5_1,0,Sparse tibbles,NA
+R_2vka0Kl6xAX434t,I have used tidymodels packages many times,I work in industry,Q5_2,40,Causal inference,NA
+R_2vka0Kl6xAX434t,I have used tidymodels packages many times,I work in industry,Q5_3,0,Improve chattr,NA
+R_2vka0Kl6xAX434t,I have used tidymodels packages many times,I work in industry,Q5_4,0,Cost-sensitive learning,NA
+R_2vka0Kl6xAX434t,I have used tidymodels packages many times,I work in industry,Q5_5,30,Stacking ensembles,NA
+R_2vka0Kl6xAX434t,I have used tidymodels packages many times,I work in industry,Q5_6,10,Spatial machine learning ,NA
+R_2vka0Kl6xAX434t,I have used tidymodels packages many times,I work in industry,Q5_10,20,Ordinal regression,NA
+R_2vka0Kl6xAX434t,I have used tidymodels packages many times,I work in industry,Q5_12,0,Other,NA
+R_51cxWdHdcbm4ZKy,I have used tidymodels packages many times,I work in industry,Q5_1,0,Sparse tibbles,NA
+R_51cxWdHdcbm4ZKy,I have used tidymodels packages many times,I work in industry,Q5_2,10,Causal inference,NA
+R_51cxWdHdcbm4ZKy,I have used tidymodels packages many times,I work in industry,Q5_3,0,Improve chattr,NA
+R_51cxWdHdcbm4ZKy,I have used tidymodels packages many times,I work in industry,Q5_4,0,Cost-sensitive learning,NA
+R_51cxWdHdcbm4ZKy,I have used tidymodels packages many times,I work in industry,Q5_5,30,Stacking ensembles,NA
+R_51cxWdHdcbm4ZKy,I have used tidymodels packages many times,I work in industry,Q5_6,0,Spatial machine learning ,NA
+R_51cxWdHdcbm4ZKy,I have used tidymodels packages many times,I work in industry,Q5_10,60,Ordinal regression,NA
+R_51cxWdHdcbm4ZKy,I have used tidymodels packages many times,I work in industry,Q5_12,0,Other,NA
+R_75KQJqsiZNgHru9,I have used tidymodels packages a few times,I work in industry,Q5_1,15,Sparse tibbles,NA
+R_75KQJqsiZNgHru9,I have used tidymodels packages a few times,I work in industry,Q5_2,60,Causal inference,NA
+R_75KQJqsiZNgHru9,I have used tidymodels packages a few times,I work in industry,Q5_3,0,Improve chattr,NA
+R_75KQJqsiZNgHru9,I have used tidymodels packages a few times,I work in industry,Q5_4,0,Cost-sensitive learning,NA
+R_75KQJqsiZNgHru9,I have used tidymodels packages a few times,I work in industry,Q5_5,20,Stacking ensembles,NA
+R_75KQJqsiZNgHru9,I have used tidymodels packages a few times,I work in industry,Q5_6,0,Spatial machine learning ,NA
+R_75KQJqsiZNgHru9,I have used tidymodels packages a few times,I work in industry,Q5_10,5,Ordinal regression,NA
+R_75KQJqsiZNgHru9,I have used tidymodels packages a few times,I work in industry,Q5_12,0,Other,NA
+R_1PH8WbOugGayT9D,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_1,5,Sparse tibbles,NA
+R_1PH8WbOugGayT9D,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_2,20,Causal inference,NA
+R_1PH8WbOugGayT9D,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_3,5,Improve chattr,NA
+R_1PH8WbOugGayT9D,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_4,20,Cost-sensitive learning,NA
+R_1PH8WbOugGayT9D,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_5,15,Stacking ensembles,NA
+R_1PH8WbOugGayT9D,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_6,5,Spatial machine learning ,NA
+R_1PH8WbOugGayT9D,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_10,30,Ordinal regression,NA
+R_1PH8WbOugGayT9D,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_12,0,Other,NA
+R_6jUOQN7L0YgCXjQ,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_1,25,Sparse tibbles,NA
+R_6jUOQN7L0YgCXjQ,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_2,0,Causal inference,NA
+R_6jUOQN7L0YgCXjQ,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_3,0,Improve chattr,NA
+R_6jUOQN7L0YgCXjQ,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_4,0,Cost-sensitive learning,NA
+R_6jUOQN7L0YgCXjQ,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_5,0,Stacking ensembles,NA
+R_6jUOQN7L0YgCXjQ,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_6,75,Spatial machine learning ,NA
+R_6jUOQN7L0YgCXjQ,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_10,0,Ordinal regression,NA
+R_6jUOQN7L0YgCXjQ,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_12,0,Other,NA
+R_18M5RVyKoHufgyT,I have contributed to tidymodels packages or taught others how to use them,I am a student,Q5_1,0,Sparse tibbles,NA
+R_18M5RVyKoHufgyT,I have contributed to tidymodels packages or taught others how to use them,I am a student,Q5_2,0,Causal inference,NA
+R_18M5RVyKoHufgyT,I have contributed to tidymodels packages or taught others how to use them,I am a student,Q5_3,0,Improve chattr,NA
+R_18M5RVyKoHufgyT,I have contributed to tidymodels packages or taught others how to use them,I am a student,Q5_4,10,Cost-sensitive learning,NA
+R_18M5RVyKoHufgyT,I have contributed to tidymodels packages or taught others how to use them,I am a student,Q5_5,50,Stacking ensembles,NA
+R_18M5RVyKoHufgyT,I have contributed to tidymodels packages or taught others how to use them,I am a student,Q5_6,30,Spatial machine learning ,NA
+R_18M5RVyKoHufgyT,I have contributed to tidymodels packages or taught others how to use them,I am a student,Q5_10,0,Ordinal regression,NA
+R_18M5RVyKoHufgyT,I have contributed to tidymodels packages or taught others how to use them,I am a student,Q5_12,10,Other,More documentation on building extension packages
+R_3sAZ6IGkTiXyBcM,I have used tidymodels packages a few times,I work in industry,Q5_1,0,Sparse tibbles,NA
+R_3sAZ6IGkTiXyBcM,I have used tidymodels packages a few times,I work in industry,Q5_2,20,Causal inference,NA
+R_3sAZ6IGkTiXyBcM,I have used tidymodels packages a few times,I work in industry,Q5_3,40,Improve chattr,NA
+R_3sAZ6IGkTiXyBcM,I have used tidymodels packages a few times,I work in industry,Q5_4,0,Cost-sensitive learning,NA
+R_3sAZ6IGkTiXyBcM,I have used tidymodels packages a few times,I work in industry,Q5_5,20,Stacking ensembles,NA
+R_3sAZ6IGkTiXyBcM,I have used tidymodels packages a few times,I work in industry,Q5_6,0,Spatial machine learning ,NA
+R_3sAZ6IGkTiXyBcM,I have used tidymodels packages a few times,I work in industry,Q5_10,20,Ordinal regression,NA
+R_3sAZ6IGkTiXyBcM,I have used tidymodels packages a few times,I work in industry,Q5_12,0,Other,NA
+R_2BQizZESv0lhhMl,I have used tidymodels packages many times,I work in industry,Q5_1,10,Sparse tibbles,NA
+R_2BQizZESv0lhhMl,I have used tidymodels packages many times,I work in industry,Q5_2,40,Causal inference,NA
+R_2BQizZESv0lhhMl,I have used tidymodels packages many times,I work in industry,Q5_3,0,Improve chattr,NA
+R_2BQizZESv0lhhMl,I have used tidymodels packages many times,I work in industry,Q5_4,10,Cost-sensitive learning,NA
+R_2BQizZESv0lhhMl,I have used tidymodels packages many times,I work in industry,Q5_5,0,Stacking ensembles,NA
+R_2BQizZESv0lhhMl,I have used tidymodels packages many times,I work in industry,Q5_6,0,Spatial machine learning ,NA
+R_2BQizZESv0lhhMl,I have used tidymodels packages many times,I work in industry,Q5_10,0,Ordinal regression,NA
+R_2BQizZESv0lhhMl,I have used tidymodels packages many times,I work in industry,Q5_12,40,Other,Markov chains
+R_5hfySJYcbSAyaxH,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_1,15,Sparse tibbles,NA
+R_5hfySJYcbSAyaxH,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_2,15,Causal inference,NA
+R_5hfySJYcbSAyaxH,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_3,10,Improve chattr,NA
+R_5hfySJYcbSAyaxH,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_4,10,Cost-sensitive learning,NA
+R_5hfySJYcbSAyaxH,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_5,15,Stacking ensembles,NA
+R_5hfySJYcbSAyaxH,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_6,15,Spatial machine learning ,NA
+R_5hfySJYcbSAyaxH,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_10,20,Ordinal regression,NA
+R_5hfySJYcbSAyaxH,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_12,0,Other,NA
+R_7fxNzOSgRbZK5xf,I have used tidymodels packages a few times,I work in industry,Q5_1,20,Sparse tibbles,NA
+R_7fxNzOSgRbZK5xf,I have used tidymodels packages a few times,I work in industry,Q5_2,0,Causal inference,NA
+R_7fxNzOSgRbZK5xf,I have used tidymodels packages a few times,I work in industry,Q5_3,50,Improve chattr,NA
+R_7fxNzOSgRbZK5xf,I have used tidymodels packages a few times,I work in industry,Q5_4,0,Cost-sensitive learning,NA
+R_7fxNzOSgRbZK5xf,I have used tidymodels packages a few times,I work in industry,Q5_5,0,Stacking ensembles,NA
+R_7fxNzOSgRbZK5xf,I have used tidymodels packages a few times,I work in industry,Q5_6,20,Spatial machine learning ,NA
+R_7fxNzOSgRbZK5xf,I have used tidymodels packages a few times,I work in industry,Q5_10,10,Ordinal regression,NA
+R_7fxNzOSgRbZK5xf,I have used tidymodels packages a few times,I work in industry,Q5_12,0,Other,NA
+R_5gvGFvwqo3B1Clt,I have used tidymodels packages many times,I work in industry,Q5_1,10,Sparse tibbles,NA
+R_5gvGFvwqo3B1Clt,I have used tidymodels packages many times,I work in industry,Q5_2,15,Causal inference,NA
+R_5gvGFvwqo3B1Clt,I have used tidymodels packages many times,I work in industry,Q5_3,5,Improve chattr,NA
+R_5gvGFvwqo3B1Clt,I have used tidymodels packages many times,I work in industry,Q5_4,5,Cost-sensitive learning,NA
+R_5gvGFvwqo3B1Clt,I have used tidymodels packages many times,I work in industry,Q5_5,15,Stacking ensembles,NA
+R_5gvGFvwqo3B1Clt,I have used tidymodels packages many times,I work in industry,Q5_6,25,Spatial machine learning ,NA
+R_5gvGFvwqo3B1Clt,I have used tidymodels packages many times,I work in industry,Q5_10,25,Ordinal regression,NA
+R_5gvGFvwqo3B1Clt,I have used tidymodels packages many times,I work in industry,Q5_12,0,Other,NA
+R_2PZtKQ22HvS8jbV,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_1,0,Sparse tibbles,NA
+R_2PZtKQ22HvS8jbV,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_2,0,Causal inference,NA
+R_2PZtKQ22HvS8jbV,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_3,0,Improve chattr,NA
+R_2PZtKQ22HvS8jbV,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_4,0,Cost-sensitive learning,NA
+R_2PZtKQ22HvS8jbV,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_5,0,Stacking ensembles,NA
+R_2PZtKQ22HvS8jbV,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_6,100,Spatial machine learning ,NA
+R_2PZtKQ22HvS8jbV,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_10,0,Ordinal regression,NA
+R_2PZtKQ22HvS8jbV,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_12,0,Other,NA
+R_1dstewUBHaDbYNE,I have used tidymodels packages a few times,I work in industry,Q5_1,20,Sparse tibbles,NA
+R_1dstewUBHaDbYNE,I have used tidymodels packages a few times,I work in industry,Q5_2,60,Causal inference,NA
+R_1dstewUBHaDbYNE,I have used tidymodels packages a few times,I work in industry,Q5_3,0,Improve chattr,NA
+R_1dstewUBHaDbYNE,I have used tidymodels packages a few times,I work in industry,Q5_4,0,Cost-sensitive learning,NA
+R_1dstewUBHaDbYNE,I have used tidymodels packages a few times,I work in industry,Q5_5,0,Stacking ensembles,NA
+R_1dstewUBHaDbYNE,I have used tidymodels packages a few times,I work in industry,Q5_6,0,Spatial machine learning ,NA
+R_1dstewUBHaDbYNE,I have used tidymodels packages a few times,I work in industry,Q5_10,20,Ordinal regression,NA
+R_1dstewUBHaDbYNE,I have used tidymodels packages a few times,I work in industry,Q5_12,0,Other,NA
+R_25T8N7vSq9gcUQ9,I have used tidymodels packages many times,I work in industry,Q5_1,0,Sparse tibbles,NA
+R_25T8N7vSq9gcUQ9,I have used tidymodels packages many times,I work in industry,Q5_2,10,Causal inference,NA
+R_25T8N7vSq9gcUQ9,I have used tidymodels packages many times,I work in industry,Q5_3,10,Improve chattr,NA
+R_25T8N7vSq9gcUQ9,I have used tidymodels packages many times,I work in industry,Q5_4,0,Cost-sensitive learning,NA
+R_25T8N7vSq9gcUQ9,I have used tidymodels packages many times,I work in industry,Q5_5,40,Stacking ensembles,NA
+R_25T8N7vSq9gcUQ9,I have used tidymodels packages many times,I work in industry,Q5_6,0,Spatial machine learning ,NA
+R_25T8N7vSq9gcUQ9,I have used tidymodels packages many times,I work in industry,Q5_10,20,Ordinal regression,NA
+R_25T8N7vSq9gcUQ9,I have used tidymodels packages many times,I work in industry,Q5_12,20,Other,"Multivariate models, better + multivariate time series"
+R_1YXOukrla4CG4FB,I have used tidymodels packages a few times,I am a student,Q5_1,20,Sparse tibbles,NA
+R_1YXOukrla4CG4FB,I have used tidymodels packages a few times,I am a student,Q5_2,40,Causal inference,NA
+R_1YXOukrla4CG4FB,I have used tidymodels packages a few times,I am a student,Q5_3,0,Improve chattr,NA
+R_1YXOukrla4CG4FB,I have used tidymodels packages a few times,I am a student,Q5_4,0,Cost-sensitive learning,NA
+R_1YXOukrla4CG4FB,I have used tidymodels packages a few times,I am a student,Q5_5,0,Stacking ensembles,NA
+R_1YXOukrla4CG4FB,I have used tidymodels packages a few times,I am a student,Q5_6,0,Spatial machine learning ,NA
+R_1YXOukrla4CG4FB,I have used tidymodels packages a few times,I am a student,Q5_10,40,Ordinal regression,NA
+R_1YXOukrla4CG4FB,I have used tidymodels packages a few times,I am a student,Q5_12,0,Other,NA
+R_61N1rn2B0whgxD8,I have used tidymodels packages a few times,I work in industry,Q5_1,0,Sparse tibbles,NA
+R_61N1rn2B0whgxD8,I have used tidymodels packages a few times,I work in industry,Q5_2,0,Causal inference,NA
+R_61N1rn2B0whgxD8,I have used tidymodels packages a few times,I work in industry,Q5_3,0,Improve chattr,NA
+R_61N1rn2B0whgxD8,I have used tidymodels packages a few times,I work in industry,Q5_4,0,Cost-sensitive learning,NA
+R_61N1rn2B0whgxD8,I have used tidymodels packages a few times,I work in industry,Q5_5,0,Stacking ensembles,NA
+R_61N1rn2B0whgxD8,I have used tidymodels packages a few times,I work in industry,Q5_6,100,Spatial machine learning ,NA
+R_61N1rn2B0whgxD8,I have used tidymodels packages a few times,I work in industry,Q5_10,0,Ordinal regression,NA
+R_61N1rn2B0whgxD8,I have used tidymodels packages a few times,I work in industry,Q5_12,0,Other,NA
+R_5o7FHNfOZSsFsMe,I have used tidymodels packages a few times,I work in industry,Q5_1,0,Sparse tibbles,NA
+R_5o7FHNfOZSsFsMe,I have used tidymodels packages a few times,I work in industry,Q5_2,50,Causal inference,NA
+R_5o7FHNfOZSsFsMe,I have used tidymodels packages a few times,I work in industry,Q5_3,0,Improve chattr,NA
+R_5o7FHNfOZSsFsMe,I have used tidymodels packages a few times,I work in industry,Q5_4,50,Cost-sensitive learning,NA
+R_5o7FHNfOZSsFsMe,I have used tidymodels packages a few times,I work in industry,Q5_5,0,Stacking ensembles,NA
+R_5o7FHNfOZSsFsMe,I have used tidymodels packages a few times,I work in industry,Q5_6,0,Spatial machine learning ,NA
+R_5o7FHNfOZSsFsMe,I have used tidymodels packages a few times,I work in industry,Q5_10,0,Ordinal regression,NA
+R_5o7FHNfOZSsFsMe,I have used tidymodels packages a few times,I work in industry,Q5_12,0,Other,NA
+R_1EumJhuuDGt9h30,I have used tidymodels packages a few times,I work in industry,Q5_1,0,Sparse tibbles,NA
+R_1EumJhuuDGt9h30,I have used tidymodels packages a few times,I work in industry,Q5_2,0,Causal inference,NA
+R_1EumJhuuDGt9h30,I have used tidymodels packages a few times,I work in industry,Q5_3,0,Improve chattr,NA
+R_1EumJhuuDGt9h30,I have used tidymodels packages a few times,I work in industry,Q5_4,0,Cost-sensitive learning,NA
+R_1EumJhuuDGt9h30,I have used tidymodels packages a few times,I work in industry,Q5_5,25,Stacking ensembles,NA
+R_1EumJhuuDGt9h30,I have used tidymodels packages a few times,I work in industry,Q5_6,0,Spatial machine learning ,NA
+R_1EumJhuuDGt9h30,I have used tidymodels packages a few times,I work in industry,Q5_10,0,Ordinal regression,NA
+R_1EumJhuuDGt9h30,I have used tidymodels packages a few times,I work in industry,Q5_12,75,Other,Bayesian Analysis
+R_1VR51MvFbHLmpFf,I have used tidymodels packages a few times,I work in industry,Q5_1,0,Sparse tibbles,NA
+R_1VR51MvFbHLmpFf,I have used tidymodels packages a few times,I work in industry,Q5_2,0,Causal inference,NA
+R_1VR51MvFbHLmpFf,I have used tidymodels packages a few times,I work in industry,Q5_3,0,Improve chattr,NA
+R_1VR51MvFbHLmpFf,I have used tidymodels packages a few times,I work in industry,Q5_4,0,Cost-sensitive learning,NA
+R_1VR51MvFbHLmpFf,I have used tidymodels packages a few times,I work in industry,Q5_5,100,Stacking ensembles,NA
+R_1VR51MvFbHLmpFf,I have used tidymodels packages a few times,I work in industry,Q5_6,0,Spatial machine learning ,NA
+R_1VR51MvFbHLmpFf,I have used tidymodels packages a few times,I work in industry,Q5_10,0,Ordinal regression,NA
+R_1VR51MvFbHLmpFf,I have used tidymodels packages a few times,I work in industry,Q5_12,0,Other,NA
+R_1FaHnft7Q5Jmjhn,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_1,0,Sparse tibbles,NA
+R_1FaHnft7Q5Jmjhn,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_2,100,Causal inference,NA
+R_1FaHnft7Q5Jmjhn,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_3,0,Improve chattr,NA
+R_1FaHnft7Q5Jmjhn,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_4,0,Cost-sensitive learning,NA
+R_1FaHnft7Q5Jmjhn,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_5,0,Stacking ensembles,NA
+R_1FaHnft7Q5Jmjhn,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_6,0,Spatial machine learning ,NA
+R_1FaHnft7Q5Jmjhn,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_10,0,Ordinal regression,NA
+R_1FaHnft7Q5Jmjhn,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_12,0,Other,NA
+R_60xTed0xRpWptzr,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_1,0,Sparse tibbles,NA
+R_60xTed0xRpWptzr,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_2,100,Causal inference,NA
+R_60xTed0xRpWptzr,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_3,0,Improve chattr,NA
+R_60xTed0xRpWptzr,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_4,0,Cost-sensitive learning,NA
+R_60xTed0xRpWptzr,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_5,0,Stacking ensembles,NA
+R_60xTed0xRpWptzr,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_6,0,Spatial machine learning ,NA
+R_60xTed0xRpWptzr,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_10,0,Ordinal regression,NA
+R_60xTed0xRpWptzr,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_12,0,Other,NA
+R_6CdAKMwpXt3TzzW,I have used tidymodels packages many times,I work in industry,Q5_1,0,Sparse tibbles,NA
+R_6CdAKMwpXt3TzzW,I have used tidymodels packages many times,I work in industry,Q5_2,30,Causal inference,NA
+R_6CdAKMwpXt3TzzW,I have used tidymodels packages many times,I work in industry,Q5_3,30,Improve chattr,NA
+R_6CdAKMwpXt3TzzW,I have used tidymodels packages many times,I work in industry,Q5_4,0,Cost-sensitive learning,NA
+R_6CdAKMwpXt3TzzW,I have used tidymodels packages many times,I work in industry,Q5_5,30,Stacking ensembles,NA
+R_6CdAKMwpXt3TzzW,I have used tidymodels packages many times,I work in industry,Q5_6,10,Spatial machine learning ,NA
+R_6CdAKMwpXt3TzzW,I have used tidymodels packages many times,I work in industry,Q5_10,0,Ordinal regression,NA
+R_6CdAKMwpXt3TzzW,I have used tidymodels packages many times,I work in industry,Q5_12,0,Other,NA
+R_17PTMOU6d0XiBih,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_1,10,Sparse tibbles,NA
+R_17PTMOU6d0XiBih,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_2,30,Causal inference,NA
+R_17PTMOU6d0XiBih,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_3,0,Improve chattr,NA
+R_17PTMOU6d0XiBih,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_4,0,Cost-sensitive learning,NA
+R_17PTMOU6d0XiBih,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_5,25,Stacking ensembles,NA
+R_17PTMOU6d0XiBih,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_6,10,Spatial machine learning ,NA
+R_17PTMOU6d0XiBih,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_10,25,Ordinal regression,NA
+R_17PTMOU6d0XiBih,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_12,0,Other,NA
+R_3zkdavIPW57PXHt,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_1,20,Sparse tibbles,NA
+R_3zkdavIPW57PXHt,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_2,0,Causal inference,NA
+R_3zkdavIPW57PXHt,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_3,0,Improve chattr,NA
+R_3zkdavIPW57PXHt,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_4,40,Cost-sensitive learning,NA
+R_3zkdavIPW57PXHt,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_5,0,Stacking ensembles,NA
+R_3zkdavIPW57PXHt,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_6,0,Spatial machine learning ,NA
+R_3zkdavIPW57PXHt,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_10,40,Ordinal regression,NA
+R_3zkdavIPW57PXHt,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_12,0,Other,NA
+R_1ABF84fteXTpKPD,I have used tidymodels packages many times,I work in industry,Q5_1,0,Sparse tibbles,NA
+R_1ABF84fteXTpKPD,I have used tidymodels packages many times,I work in industry,Q5_2,0,Causal inference,NA
+R_1ABF84fteXTpKPD,I have used tidymodels packages many times,I work in industry,Q5_3,50,Improve chattr,NA
+R_1ABF84fteXTpKPD,I have used tidymodels packages many times,I work in industry,Q5_4,0,Cost-sensitive learning,NA
+R_1ABF84fteXTpKPD,I have used tidymodels packages many times,I work in industry,Q5_5,0,Stacking ensembles,NA
+R_1ABF84fteXTpKPD,I have used tidymodels packages many times,I work in industry,Q5_6,0,Spatial machine learning ,NA
+R_1ABF84fteXTpKPD,I have used tidymodels packages many times,I work in industry,Q5_10,0,Ordinal regression,NA
+R_1ABF84fteXTpKPD,I have used tidymodels packages many times,I work in industry,Q5_12,50,Other,conformal prediction (eg venn-abers etc)
+R_8pRezhVbNqeSXha,I have used tidymodels packages a few times,I work in industry,Q5_1,0,Sparse tibbles,NA
+R_8pRezhVbNqeSXha,I have used tidymodels packages a few times,I work in industry,Q5_2,15,Causal inference,NA
+R_8pRezhVbNqeSXha,I have used tidymodels packages a few times,I work in industry,Q5_3,0,Improve chattr,NA
+R_8pRezhVbNqeSXha,I have used tidymodels packages a few times,I work in industry,Q5_4,0,Cost-sensitive learning,NA
+R_8pRezhVbNqeSXha,I have used tidymodels packages a few times,I work in industry,Q5_5,35,Stacking ensembles,NA
+R_8pRezhVbNqeSXha,I have used tidymodels packages a few times,I work in industry,Q5_6,50,Spatial machine learning ,NA
+R_8pRezhVbNqeSXha,I have used tidymodels packages a few times,I work in industry,Q5_10,0,Ordinal regression,NA
+R_8pRezhVbNqeSXha,I have used tidymodels packages a few times,I work in industry,Q5_12,0,Other,NA
+R_5oNiTTBHFMiHK7Z,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_1,0,Sparse tibbles,NA
+R_5oNiTTBHFMiHK7Z,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_2,0,Causal inference,NA
+R_5oNiTTBHFMiHK7Z,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_3,0,Improve chattr,NA
+R_5oNiTTBHFMiHK7Z,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_4,80,Cost-sensitive learning,NA
+R_5oNiTTBHFMiHK7Z,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_5,20,Stacking ensembles,NA
+R_5oNiTTBHFMiHK7Z,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_6,0,Spatial machine learning ,NA
+R_5oNiTTBHFMiHK7Z,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_10,0,Ordinal regression,NA
+R_5oNiTTBHFMiHK7Z,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_12,0,Other,NA
+R_1dvtsgh6YdyUkWI,I have used tidymodels packages many times,I work in industry,Q5_1,0,Sparse tibbles,NA
+R_1dvtsgh6YdyUkWI,I have used tidymodels packages many times,I work in industry,Q5_2,0,Causal inference,NA
+R_1dvtsgh6YdyUkWI,I have used tidymodels packages many times,I work in industry,Q5_3,0,Improve chattr,NA
+R_1dvtsgh6YdyUkWI,I have used tidymodels packages many times,I work in industry,Q5_4,0,Cost-sensitive learning,NA
+R_1dvtsgh6YdyUkWI,I have used tidymodels packages many times,I work in industry,Q5_5,50,Stacking ensembles,NA
+R_1dvtsgh6YdyUkWI,I have used tidymodels packages many times,I work in industry,Q5_6,50,Spatial machine learning ,NA
+R_1dvtsgh6YdyUkWI,I have used tidymodels packages many times,I work in industry,Q5_10,0,Ordinal regression,NA
+R_1dvtsgh6YdyUkWI,I have used tidymodels packages many times,I work in industry,Q5_12,0,Other,NA
+R_3OUdZTrOGT37JD6,I have used tidymodels packages many times,I work in industry,Q5_1,0,Sparse tibbles,NA
+R_3OUdZTrOGT37JD6,I have used tidymodels packages many times,I work in industry,Q5_2,0,Causal inference,NA
+R_3OUdZTrOGT37JD6,I have used tidymodels packages many times,I work in industry,Q5_3,60,Improve chattr,NA
+R_3OUdZTrOGT37JD6,I have used tidymodels packages many times,I work in industry,Q5_4,0,Cost-sensitive learning,NA
+R_3OUdZTrOGT37JD6,I have used tidymodels packages many times,I work in industry,Q5_5,20,Stacking ensembles,NA
+R_3OUdZTrOGT37JD6,I have used tidymodels packages many times,I work in industry,Q5_6,0,Spatial machine learning ,NA
+R_3OUdZTrOGT37JD6,I have used tidymodels packages many times,I work in industry,Q5_10,20,Ordinal regression,NA
+R_3OUdZTrOGT37JD6,I have used tidymodels packages many times,I work in industry,Q5_12,0,Other,NA
+R_5dhYqTJj4cOTnTO,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_1,0,Sparse tibbles,NA
+R_5dhYqTJj4cOTnTO,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_2,0,Causal inference,NA
+R_5dhYqTJj4cOTnTO,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_3,0,Improve chattr,NA
+R_5dhYqTJj4cOTnTO,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_4,0,Cost-sensitive learning,NA
+R_5dhYqTJj4cOTnTO,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_5,25,Stacking ensembles,NA
+R_5dhYqTJj4cOTnTO,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_6,0,Spatial machine learning ,NA
+R_5dhYqTJj4cOTnTO,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_10,75,Ordinal regression,NA
+R_5dhYqTJj4cOTnTO,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_12,0,Other,NA
+R_2lW8JShnn7Oprei,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_1,30,Sparse tibbles,NA
+R_2lW8JShnn7Oprei,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_2,30,Causal inference,NA
+R_2lW8JShnn7Oprei,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_3,30,Improve chattr,NA
+R_2lW8JShnn7Oprei,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_4,10,Cost-sensitive learning,NA
+R_2lW8JShnn7Oprei,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_5,0,Stacking ensembles,NA
+R_2lW8JShnn7Oprei,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_6,0,Spatial machine learning ,NA
+R_2lW8JShnn7Oprei,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_10,0,Ordinal regression,NA
+R_2lW8JShnn7Oprei,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_12,0,Other,NA
+R_4cuYJJoilydQLbK,I have used tidymodels packages a few times,I work in industry,Q5_1,5,Sparse tibbles,NA
+R_4cuYJJoilydQLbK,I have used tidymodels packages a few times,I work in industry,Q5_2,25,Causal inference,NA
+R_4cuYJJoilydQLbK,I have used tidymodels packages a few times,I work in industry,Q5_3,5,Improve chattr,NA
+R_4cuYJJoilydQLbK,I have used tidymodels packages a few times,I work in industry,Q5_4,10,Cost-sensitive learning,NA
+R_4cuYJJoilydQLbK,I have used tidymodels packages a few times,I work in industry,Q5_5,10,Stacking ensembles,NA
+R_4cuYJJoilydQLbK,I have used tidymodels packages a few times,I work in industry,Q5_6,25,Spatial machine learning ,NA
+R_4cuYJJoilydQLbK,I have used tidymodels packages a few times,I work in industry,Q5_10,20,Ordinal regression,NA
+R_4cuYJJoilydQLbK,I have used tidymodels packages a few times,I work in industry,Q5_12,0,Other,NA
+R_4wMJ6I97vs8c4VT,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_1,10,Sparse tibbles,NA
+R_4wMJ6I97vs8c4VT,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_2,50,Causal inference,NA
+R_4wMJ6I97vs8c4VT,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_3,0,Improve chattr,NA
+R_4wMJ6I97vs8c4VT,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_4,0,Cost-sensitive learning,NA
+R_4wMJ6I97vs8c4VT,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_5,20,Stacking ensembles,NA
+R_4wMJ6I97vs8c4VT,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_6,20,Spatial machine learning ,NA
+R_4wMJ6I97vs8c4VT,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_10,0,Ordinal regression,NA
+R_4wMJ6I97vs8c4VT,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_12,0,Other,NA
+R_1qdHCezqdnHiqrw,I have used tidymodels packages a few times,I work in industry,Q5_1,25,Sparse tibbles,NA
+R_1qdHCezqdnHiqrw,I have used tidymodels packages a few times,I work in industry,Q5_2,25,Causal inference,NA
+R_1qdHCezqdnHiqrw,I have used tidymodels packages a few times,I work in industry,Q5_3,0,Improve chattr,NA
+R_1qdHCezqdnHiqrw,I have used tidymodels packages a few times,I work in industry,Q5_4,25,Cost-sensitive learning,NA
+R_1qdHCezqdnHiqrw,I have used tidymodels packages a few times,I work in industry,Q5_5,0,Stacking ensembles,NA
+R_1qdHCezqdnHiqrw,I have used tidymodels packages a few times,I work in industry,Q5_6,0,Spatial machine learning ,NA
+R_1qdHCezqdnHiqrw,I have used tidymodels packages a few times,I work in industry,Q5_10,25,Ordinal regression,NA
+R_1qdHCezqdnHiqrw,I have used tidymodels packages a few times,I work in industry,Q5_12,0,Other,NA
+R_1arxnR8b1DUicPD,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_1,0,Sparse tibbles,NA
+R_1arxnR8b1DUicPD,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_2,25,Causal inference,NA
+R_1arxnR8b1DUicPD,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_3,0,Improve chattr,NA
+R_1arxnR8b1DUicPD,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_4,0,Cost-sensitive learning,NA
+R_1arxnR8b1DUicPD,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_5,0,Stacking ensembles,NA
+R_1arxnR8b1DUicPD,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_6,50,Spatial machine learning ,NA
+R_1arxnR8b1DUicPD,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_10,25,Ordinal regression,NA
+R_1arxnR8b1DUicPD,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_12,0,Other,NA
+R_6e3td2XXu8mqgcJ,I have used tidymodels packages many times,I work in industry,Q5_1,10,Sparse tibbles,NA
+R_6e3td2XXu8mqgcJ,I have used tidymodels packages many times,I work in industry,Q5_2,35,Causal inference,NA
+R_6e3td2XXu8mqgcJ,I have used tidymodels packages many times,I work in industry,Q5_3,40,Improve chattr,NA
+R_6e3td2XXu8mqgcJ,I have used tidymodels packages many times,I work in industry,Q5_4,10,Cost-sensitive learning,NA
+R_6e3td2XXu8mqgcJ,I have used tidymodels packages many times,I work in industry,Q5_5,5,Stacking ensembles,NA
+R_6e3td2XXu8mqgcJ,I have used tidymodels packages many times,I work in industry,Q5_6,0,Spatial machine learning ,NA
+R_6e3td2XXu8mqgcJ,I have used tidymodels packages many times,I work in industry,Q5_10,0,Ordinal regression,NA
+R_6e3td2XXu8mqgcJ,I have used tidymodels packages many times,I work in industry,Q5_12,0,Other,NA
+R_8BTQgXWOkhRl3kl,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_1,10,Sparse tibbles,NA
+R_8BTQgXWOkhRl3kl,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_2,35,Causal inference,NA
+R_8BTQgXWOkhRl3kl,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_3,5,Improve chattr,NA
+R_8BTQgXWOkhRl3kl,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_4,15,Cost-sensitive learning,NA
+R_8BTQgXWOkhRl3kl,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_5,5,Stacking ensembles,NA
+R_8BTQgXWOkhRl3kl,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_6,10,Spatial machine learning ,NA
+R_8BTQgXWOkhRl3kl,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_10,20,Ordinal regression,NA
+R_8BTQgXWOkhRl3kl,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_12,0,Other,NA
+R_6yuaYNhU9Ib3VhD,I have used tidymodels packages a few times,I work in industry,Q5_1,10,Sparse tibbles,NA
+R_6yuaYNhU9Ib3VhD,I have used tidymodels packages a few times,I work in industry,Q5_2,15,Causal inference,NA
+R_6yuaYNhU9Ib3VhD,I have used tidymodels packages a few times,I work in industry,Q5_3,10,Improve chattr,NA
+R_6yuaYNhU9Ib3VhD,I have used tidymodels packages a few times,I work in industry,Q5_4,10,Cost-sensitive learning,NA
+R_6yuaYNhU9Ib3VhD,I have used tidymodels packages a few times,I work in industry,Q5_5,10,Stacking ensembles,NA
+R_6yuaYNhU9Ib3VhD,I have used tidymodels packages a few times,I work in industry,Q5_6,10,Spatial machine learning ,NA
+R_6yuaYNhU9Ib3VhD,I have used tidymodels packages a few times,I work in industry,Q5_10,15,Ordinal regression,NA
+R_6yuaYNhU9Ib3VhD,I have used tidymodels packages a few times,I work in industry,Q5_12,20,Other,tidymodels educational materials
+R_11v9nuQZSkxWPWQ,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_1,0,Sparse tibbles,NA
+R_11v9nuQZSkxWPWQ,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_2,0,Causal inference,NA
+R_11v9nuQZSkxWPWQ,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_3,10,Improve chattr,NA
+R_11v9nuQZSkxWPWQ,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_4,0,Cost-sensitive learning,NA
+R_11v9nuQZSkxWPWQ,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_5,0,Stacking ensembles,NA
+R_11v9nuQZSkxWPWQ,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_6,90,Spatial machine learning ,NA
+R_11v9nuQZSkxWPWQ,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_10,0,Ordinal regression,NA
+R_11v9nuQZSkxWPWQ,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_12,0,Other,NA
+R_2kF2dzjN8uSxgBP,I have never used tidymodels,"I am an academic, professor, and/or researcher",Q5_1,0,Sparse tibbles,NA
+R_2kF2dzjN8uSxgBP,I have never used tidymodels,"I am an academic, professor, and/or researcher",Q5_2,0,Causal inference,NA
+R_2kF2dzjN8uSxgBP,I have never used tidymodels,"I am an academic, professor, and/or researcher",Q5_3,0,Improve chattr,NA
+R_2kF2dzjN8uSxgBP,I have never used tidymodels,"I am an academic, professor, and/or researcher",Q5_4,0,Cost-sensitive learning,NA
+R_2kF2dzjN8uSxgBP,I have never used tidymodels,"I am an academic, professor, and/or researcher",Q5_5,0,Stacking ensembles,NA
+R_2kF2dzjN8uSxgBP,I have never used tidymodels,"I am an academic, professor, and/or researcher",Q5_6,0,Spatial machine learning ,NA
+R_2kF2dzjN8uSxgBP,I have never used tidymodels,"I am an academic, professor, and/or researcher",Q5_10,0,Ordinal regression,NA
+R_2kF2dzjN8uSxgBP,I have never used tidymodels,"I am an academic, professor, and/or researcher",Q5_12,100,Other,Bayesian inference
+R_6OGr3o5Cb9NXbv4,I have used tidymodels packages many times,I work in industry,Q5_1,15,Sparse tibbles,NA
+R_6OGr3o5Cb9NXbv4,I have used tidymodels packages many times,I work in industry,Q5_2,0,Causal inference,NA
+R_6OGr3o5Cb9NXbv4,I have used tidymodels packages many times,I work in industry,Q5_3,0,Improve chattr,NA
+R_6OGr3o5Cb9NXbv4,I have used tidymodels packages many times,I work in industry,Q5_4,25,Cost-sensitive learning,NA
+R_6OGr3o5Cb9NXbv4,I have used tidymodels packages many times,I work in industry,Q5_5,25,Stacking ensembles,NA
+R_6OGr3o5Cb9NXbv4,I have used tidymodels packages many times,I work in industry,Q5_6,35,Spatial machine learning ,NA
+R_6OGr3o5Cb9NXbv4,I have used tidymodels packages many times,I work in industry,Q5_10,0,Ordinal regression,NA
+R_6OGr3o5Cb9NXbv4,I have used tidymodels packages many times,I work in industry,Q5_12,0,Other,NA
+R_62tVHihAj2N1h68,I have used tidymodels packages many times,I work in industry,Q5_1,15,Sparse tibbles,NA
+R_62tVHihAj2N1h68,I have used tidymodels packages many times,I work in industry,Q5_2,25,Causal inference,NA
+R_62tVHihAj2N1h68,I have used tidymodels packages many times,I work in industry,Q5_3,20,Improve chattr,NA
+R_62tVHihAj2N1h68,I have used tidymodels packages many times,I work in industry,Q5_4,40,Cost-sensitive learning,NA
+R_62tVHihAj2N1h68,I have used tidymodels packages many times,I work in industry,Q5_5,0,Stacking ensembles,NA
+R_62tVHihAj2N1h68,I have used tidymodels packages many times,I work in industry,Q5_6,0,Spatial machine learning ,NA
+R_62tVHihAj2N1h68,I have used tidymodels packages many times,I work in industry,Q5_10,0,Ordinal regression,NA
+R_62tVHihAj2N1h68,I have used tidymodels packages many times,I work in industry,Q5_12,0,Other,NA
+R_2KusmX2ID9Ownlu,I have used tidymodels packages a few times,I am a student,Q5_1,0,Sparse tibbles,NA
+R_2KusmX2ID9Ownlu,I have used tidymodels packages a few times,I am a student,Q5_2,50,Causal inference,NA
+R_2KusmX2ID9Ownlu,I have used tidymodels packages a few times,I am a student,Q5_3,0,Improve chattr,NA
+R_2KusmX2ID9Ownlu,I have used tidymodels packages a few times,I am a student,Q5_4,0,Cost-sensitive learning,NA
+R_2KusmX2ID9Ownlu,I have used tidymodels packages a few times,I am a student,Q5_5,0,Stacking ensembles,NA
+R_2KusmX2ID9Ownlu,I have used tidymodels packages a few times,I am a student,Q5_6,0,Spatial machine learning ,NA
+R_2KusmX2ID9Ownlu,I have used tidymodels packages a few times,I am a student,Q5_10,50,Ordinal regression,NA
+R_2KusmX2ID9Ownlu,I have used tidymodels packages a few times,I am a student,Q5_12,0,Other,NA
+R_3QK2bsPdArYhOGS,I have used tidymodels packages many times,I work in industry,Q5_1,0,Sparse tibbles,NA
+R_3QK2bsPdArYhOGS,I have used tidymodels packages many times,I work in industry,Q5_2,30,Causal inference,NA
+R_3QK2bsPdArYhOGS,I have used tidymodels packages many times,I work in industry,Q5_3,0,Improve chattr,NA
+R_3QK2bsPdArYhOGS,I have used tidymodels packages many times,I work in industry,Q5_4,20,Cost-sensitive learning,NA
+R_3QK2bsPdArYhOGS,I have used tidymodels packages many times,I work in industry,Q5_5,0,Stacking ensembles,NA
+R_3QK2bsPdArYhOGS,I have used tidymodels packages many times,I work in industry,Q5_6,0,Spatial machine learning ,NA
+R_3QK2bsPdArYhOGS,I have used tidymodels packages many times,I work in industry,Q5_10,15,Ordinal regression,NA
+R_3QK2bsPdArYhOGS,I have used tidymodels packages many times,I work in industry,Q5_12,35,Other,Sparklyr
+R_1ffo6TAMkICqPFi,I have contributed to tidymodels packages or taught others how to use them,I am a student,Q5_1,0,Sparse tibbles,NA
+R_1ffo6TAMkICqPFi,I have contributed to tidymodels packages or taught others how to use them,I am a student,Q5_2,35,Causal inference,NA
+R_1ffo6TAMkICqPFi,I have contributed to tidymodels packages or taught others how to use them,I am a student,Q5_3,0,Improve chattr,NA
+R_1ffo6TAMkICqPFi,I have contributed to tidymodels packages or taught others how to use them,I am a student,Q5_4,0,Cost-sensitive learning,NA
+R_1ffo6TAMkICqPFi,I have contributed to tidymodels packages or taught others how to use them,I am a student,Q5_5,30,Stacking ensembles,NA
+R_1ffo6TAMkICqPFi,I have contributed to tidymodels packages or taught others how to use them,I am a student,Q5_6,0,Spatial machine learning ,NA
+R_1ffo6TAMkICqPFi,I have contributed to tidymodels packages or taught others how to use them,I am a student,Q5_10,35,Ordinal regression,NA
+R_1ffo6TAMkICqPFi,I have contributed to tidymodels packages or taught others how to use them,I am a student,Q5_12,0,Other,NA
+R_1zdE9JJXiv0pWpP,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_1,0,Sparse tibbles,NA
+R_1zdE9JJXiv0pWpP,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_2,10,Causal inference,NA
+R_1zdE9JJXiv0pWpP,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_3,50,Improve chattr,NA
+R_1zdE9JJXiv0pWpP,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_4,0,Cost-sensitive learning,NA
+R_1zdE9JJXiv0pWpP,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_5,0,Stacking ensembles,NA
+R_1zdE9JJXiv0pWpP,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_6,0,Spatial machine learning ,NA
+R_1zdE9JJXiv0pWpP,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_10,10,Ordinal regression,NA
+R_1zdE9JJXiv0pWpP,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_12,30,Other,mixed effects random forest (MERF)
+R_408CZjRjQZAvlel,I have used tidymodels packages many times,I work in industry,Q5_1,20,Sparse tibbles,NA
+R_408CZjRjQZAvlel,I have used tidymodels packages many times,I work in industry,Q5_2,5,Causal inference,NA
+R_408CZjRjQZAvlel,I have used tidymodels packages many times,I work in industry,Q5_3,20,Improve chattr,NA
+R_408CZjRjQZAvlel,I have used tidymodels packages many times,I work in industry,Q5_4,10,Cost-sensitive learning,NA
+R_408CZjRjQZAvlel,I have used tidymodels packages many times,I work in industry,Q5_5,20,Stacking ensembles,NA
+R_408CZjRjQZAvlel,I have used tidymodels packages many times,I work in industry,Q5_6,10,Spatial machine learning ,NA
+R_408CZjRjQZAvlel,I have used tidymodels packages many times,I work in industry,Q5_10,15,Ordinal regression,NA
+R_408CZjRjQZAvlel,I have used tidymodels packages many times,I work in industry,Q5_12,0,Other,NA
+R_2qwldAsTBhR0479,I have used tidymodels packages a few times,I work in industry,Q5_1,0,Sparse tibbles,NA
+R_2qwldAsTBhR0479,I have used tidymodels packages a few times,I work in industry,Q5_2,20,Causal inference,NA
+R_2qwldAsTBhR0479,I have used tidymodels packages a few times,I work in industry,Q5_3,0,Improve chattr,NA
+R_2qwldAsTBhR0479,I have used tidymodels packages a few times,I work in industry,Q5_4,0,Cost-sensitive learning,NA
+R_2qwldAsTBhR0479,I have used tidymodels packages a few times,I work in industry,Q5_5,10,Stacking ensembles,NA
+R_2qwldAsTBhR0479,I have used tidymodels packages a few times,I work in industry,Q5_6,0,Spatial machine learning ,NA
+R_2qwldAsTBhR0479,I have used tidymodels packages a few times,I work in industry,Q5_10,10,Ordinal regression,NA
+R_2qwldAsTBhR0479,I have used tidymodels packages a few times,I work in industry,Q5_12,60,Other,"Forecasting (gluonts, deepar, nbeats): I am not a fan of modeltime package. Facilitate forecasting with tree based models (rf, xgboost, catboost, lightgbm). Think of this as the expansion of fpp3 lib."
+R_7AEfIDJu5gs2fxd,I have contributed to tidymodels packages or taught others how to use them,I am a student,Q5_1,0,Sparse tibbles,NA
+R_7AEfIDJu5gs2fxd,I have contributed to tidymodels packages or taught others how to use them,I am a student,Q5_2,25,Causal inference,NA
+R_7AEfIDJu5gs2fxd,I have contributed to tidymodels packages or taught others how to use them,I am a student,Q5_3,0,Improve chattr,NA
+R_7AEfIDJu5gs2fxd,I have contributed to tidymodels packages or taught others how to use them,I am a student,Q5_4,0,Cost-sensitive learning,NA
+R_7AEfIDJu5gs2fxd,I have contributed to tidymodels packages or taught others how to use them,I am a student,Q5_5,50,Stacking ensembles,NA
+R_7AEfIDJu5gs2fxd,I have contributed to tidymodels packages or taught others how to use them,I am a student,Q5_6,0,Spatial machine learning ,NA
+R_7AEfIDJu5gs2fxd,I have contributed to tidymodels packages or taught others how to use them,I am a student,Q5_10,25,Ordinal regression,NA
+R_7AEfIDJu5gs2fxd,I have contributed to tidymodels packages or taught others how to use them,I am a student,Q5_12,0,Other,NA
+R_7rNyFKZFwGNYTKh,I have used tidymodels packages many times,I work in industry,Q5_1,0,Sparse tibbles,NA
+R_7rNyFKZFwGNYTKh,I have used tidymodels packages many times,I work in industry,Q5_2,45,Causal inference,NA
+R_7rNyFKZFwGNYTKh,I have used tidymodels packages many times,I work in industry,Q5_3,0,Improve chattr,NA
+R_7rNyFKZFwGNYTKh,I have used tidymodels packages many times,I work in industry,Q5_4,0,Cost-sensitive learning,NA
+R_7rNyFKZFwGNYTKh,I have used tidymodels packages many times,I work in industry,Q5_5,20,Stacking ensembles,NA
+R_7rNyFKZFwGNYTKh,I have used tidymodels packages many times,I work in industry,Q5_6,0,Spatial machine learning ,NA
+R_7rNyFKZFwGNYTKh,I have used tidymodels packages many times,I work in industry,Q5_10,35,Ordinal regression,NA
+R_7rNyFKZFwGNYTKh,I have used tidymodels packages many times,I work in industry,Q5_12,0,Other,NA
+R_1VC5Pjnjj4n5Llj,I have contributed to tidymodels packages or taught others how to use them,"I am an academic, professor, and/or researcher",Q5_1,5,Sparse tibbles,NA
+R_1VC5Pjnjj4n5Llj,I have contributed to tidymodels packages or taught others how to use them,"I am an academic, professor, and/or researcher",Q5_2,15,Causal inference,NA
+R_1VC5Pjnjj4n5Llj,I have contributed to tidymodels packages or taught others how to use them,"I am an academic, professor, and/or researcher",Q5_3,0,Improve chattr,NA
+R_1VC5Pjnjj4n5Llj,I have contributed to tidymodels packages or taught others how to use them,"I am an academic, professor, and/or researcher",Q5_4,0,Cost-sensitive learning,NA
+R_1VC5Pjnjj4n5Llj,I have contributed to tidymodels packages or taught others how to use them,"I am an academic, professor, and/or researcher",Q5_5,0,Stacking ensembles,NA
+R_1VC5Pjnjj4n5Llj,I have contributed to tidymodels packages or taught others how to use them,"I am an academic, professor, and/or researcher",Q5_6,80,Spatial machine learning ,NA
+R_1VC5Pjnjj4n5Llj,I have contributed to tidymodels packages or taught others how to use them,"I am an academic, professor, and/or researcher",Q5_10,0,Ordinal regression,NA
+R_1VC5Pjnjj4n5Llj,I have contributed to tidymodels packages or taught others how to use them,"I am an academic, professor, and/or researcher",Q5_12,0,Other,NA
+R_754J8eHsgPYpvLb,I have never used tidymodels,"I am an academic, professor, and/or researcher",Q5_1,0,Sparse tibbles,NA
+R_754J8eHsgPYpvLb,I have never used tidymodels,"I am an academic, professor, and/or researcher",Q5_2,40,Causal inference,NA
+R_754J8eHsgPYpvLb,I have never used tidymodels,"I am an academic, professor, and/or researcher",Q5_3,0,Improve chattr,NA
+R_754J8eHsgPYpvLb,I have never used tidymodels,"I am an academic, professor, and/or researcher",Q5_4,5,Cost-sensitive learning,NA
+R_754J8eHsgPYpvLb,I have never used tidymodels,"I am an academic, professor, and/or researcher",Q5_5,25,Stacking ensembles,NA
+R_754J8eHsgPYpvLb,I have never used tidymodels,"I am an academic, professor, and/or researcher",Q5_6,5,Spatial machine learning ,NA
+R_754J8eHsgPYpvLb,I have never used tidymodels,"I am an academic, professor, and/or researcher",Q5_10,25,Ordinal regression,NA
+R_754J8eHsgPYpvLb,I have never used tidymodels,"I am an academic, professor, and/or researcher",Q5_12,0,Other,NA
+R_7b4vwZPnaoXseuR,I have used tidymodels packages many times,I work in industry,Q5_1,35,Sparse tibbles,NA
+R_7b4vwZPnaoXseuR,I have used tidymodels packages many times,I work in industry,Q5_2,15,Causal inference,NA
+R_7b4vwZPnaoXseuR,I have used tidymodels packages many times,I work in industry,Q5_3,15,Improve chattr,NA
+R_7b4vwZPnaoXseuR,I have used tidymodels packages many times,I work in industry,Q5_4,0,Cost-sensitive learning,NA
+R_7b4vwZPnaoXseuR,I have used tidymodels packages many times,I work in industry,Q5_5,0,Stacking ensembles,NA
+R_7b4vwZPnaoXseuR,I have used tidymodels packages many times,I work in industry,Q5_6,0,Spatial machine learning ,NA
+R_7b4vwZPnaoXseuR,I have used tidymodels packages many times,I work in industry,Q5_10,35,Ordinal regression,NA
+R_7b4vwZPnaoXseuR,I have used tidymodels packages many times,I work in industry,Q5_12,0,Other,NA
+R_6p00rJuUeoZYC1X,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_1,15,Sparse tibbles,NA
+R_6p00rJuUeoZYC1X,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_2,10,Causal inference,NA
+R_6p00rJuUeoZYC1X,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_3,0,Improve chattr,NA
+R_6p00rJuUeoZYC1X,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_4,20,Cost-sensitive learning,NA
+R_6p00rJuUeoZYC1X,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_5,15,Stacking ensembles,NA
+R_6p00rJuUeoZYC1X,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_6,0,Spatial machine learning ,NA
+R_6p00rJuUeoZYC1X,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_10,40,Ordinal regression,NA
+R_6p00rJuUeoZYC1X,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_12,0,Other,NA
+R_5xUgFAQtqKaSNax,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_1,5,Sparse tibbles,NA
+R_5xUgFAQtqKaSNax,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_2,35,Causal inference,NA
+R_5xUgFAQtqKaSNax,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_3,0,Improve chattr,NA
+R_5xUgFAQtqKaSNax,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_4,2,Cost-sensitive learning,NA
+R_5xUgFAQtqKaSNax,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_5,3,Stacking ensembles,NA
+R_5xUgFAQtqKaSNax,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_6,10,Spatial machine learning ,NA
+R_5xUgFAQtqKaSNax,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_10,30,Ordinal regression,NA
+R_5xUgFAQtqKaSNax,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_12,15,Other,Compositional Data Analysis
+R_4EjvjabdUcnQJsB,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_1,20,Sparse tibbles,NA
+R_4EjvjabdUcnQJsB,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_2,20,Causal inference,NA
+R_4EjvjabdUcnQJsB,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_3,0,Improve chattr,NA
+R_4EjvjabdUcnQJsB,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_4,0,Cost-sensitive learning,NA
+R_4EjvjabdUcnQJsB,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_5,20,Stacking ensembles,NA
+R_4EjvjabdUcnQJsB,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_6,20,Spatial machine learning ,NA
+R_4EjvjabdUcnQJsB,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_10,20,Ordinal regression,NA
+R_4EjvjabdUcnQJsB,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_12,0,Other,NA
+R_7Y5FlEAGLCRVFuh,I have contributed to tidymodels packages or taught others how to use them,"I am an academic, professor, and/or researcher",Q5_1,0,Sparse tibbles,NA
+R_7Y5FlEAGLCRVFuh,I have contributed to tidymodels packages or taught others how to use them,"I am an academic, professor, and/or researcher",Q5_2,40,Causal inference,NA
+R_7Y5FlEAGLCRVFuh,I have contributed to tidymodels packages or taught others how to use them,"I am an academic, professor, and/or researcher",Q5_3,40,Improve chattr,NA
+R_7Y5FlEAGLCRVFuh,I have contributed to tidymodels packages or taught others how to use them,"I am an academic, professor, and/or researcher",Q5_4,20,Cost-sensitive learning,NA
+R_7Y5FlEAGLCRVFuh,I have contributed to tidymodels packages or taught others how to use them,"I am an academic, professor, and/or researcher",Q5_5,0,Stacking ensembles,NA
+R_7Y5FlEAGLCRVFuh,I have contributed to tidymodels packages or taught others how to use them,"I am an academic, professor, and/or researcher",Q5_6,0,Spatial machine learning ,NA
+R_7Y5FlEAGLCRVFuh,I have contributed to tidymodels packages or taught others how to use them,"I am an academic, professor, and/or researcher",Q5_10,0,Ordinal regression,NA
+R_7Y5FlEAGLCRVFuh,I have contributed to tidymodels packages or taught others how to use them,"I am an academic, professor, and/or researcher",Q5_12,0,Other,NA
+R_1fjBElR4duc8BHN,I have never used tidymodels,I work in industry,Q5_1,0,Sparse tibbles,NA
+R_1fjBElR4duc8BHN,I have never used tidymodels,I work in industry,Q5_2,50,Causal inference,NA
+R_1fjBElR4duc8BHN,I have never used tidymodels,I work in industry,Q5_3,0,Improve chattr,NA
+R_1fjBElR4duc8BHN,I have never used tidymodels,I work in industry,Q5_4,50,Cost-sensitive learning,NA
+R_1fjBElR4duc8BHN,I have never used tidymodels,I work in industry,Q5_5,0,Stacking ensembles,NA
+R_1fjBElR4duc8BHN,I have never used tidymodels,I work in industry,Q5_6,0,Spatial machine learning ,NA
+R_1fjBElR4duc8BHN,I have never used tidymodels,I work in industry,Q5_10,0,Ordinal regression,NA
+R_1fjBElR4duc8BHN,I have never used tidymodels,I work in industry,Q5_12,0,Other,NA
+R_5TRcnRfxiO8lRpV,I have used tidymodels packages many times,I work in industry,Q5_1,40,Sparse tibbles,NA
+R_5TRcnRfxiO8lRpV,I have used tidymodels packages many times,I work in industry,Q5_2,20,Causal inference,NA
+R_5TRcnRfxiO8lRpV,I have used tidymodels packages many times,I work in industry,Q5_3,40,Improve chattr,NA
+R_5TRcnRfxiO8lRpV,I have used tidymodels packages many times,I work in industry,Q5_4,0,Cost-sensitive learning,NA
+R_5TRcnRfxiO8lRpV,I have used tidymodels packages many times,I work in industry,Q5_5,0,Stacking ensembles,NA
+R_5TRcnRfxiO8lRpV,I have used tidymodels packages many times,I work in industry,Q5_6,0,Spatial machine learning ,NA
+R_5TRcnRfxiO8lRpV,I have used tidymodels packages many times,I work in industry,Q5_10,0,Ordinal regression,NA
+R_5TRcnRfxiO8lRpV,I have used tidymodels packages many times,I work in industry,Q5_12,0,Other,NA
+R_5CZwrEhfg7tsGvX,I have contributed to tidymodels packages or taught others how to use them,"I am an academic, professor, and/or researcher",Q5_1,0,Sparse tibbles,NA
+R_5CZwrEhfg7tsGvX,I have contributed to tidymodels packages or taught others how to use them,"I am an academic, professor, and/or researcher",Q5_2,25,Causal inference,NA
+R_5CZwrEhfg7tsGvX,I have contributed to tidymodels packages or taught others how to use them,"I am an academic, professor, and/or researcher",Q5_3,0,Improve chattr,NA
+R_5CZwrEhfg7tsGvX,I have contributed to tidymodels packages or taught others how to use them,"I am an academic, professor, and/or researcher",Q5_4,0,Cost-sensitive learning,NA
+R_5CZwrEhfg7tsGvX,I have contributed to tidymodels packages or taught others how to use them,"I am an academic, professor, and/or researcher",Q5_5,5,Stacking ensembles,NA
+R_5CZwrEhfg7tsGvX,I have contributed to tidymodels packages or taught others how to use them,"I am an academic, professor, and/or researcher",Q5_6,0,Spatial machine learning ,NA
+R_5CZwrEhfg7tsGvX,I have contributed to tidymodels packages or taught others how to use them,"I am an academic, professor, and/or researcher",Q5_10,70,Ordinal regression,NA
+R_5CZwrEhfg7tsGvX,I have contributed to tidymodels packages or taught others how to use them,"I am an academic, professor, and/or researcher",Q5_12,0,Other,NA
+R_4SDpL6f4IGHo2mH,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_1,10,Sparse tibbles,NA
+R_4SDpL6f4IGHo2mH,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_2,0,Causal inference,NA
+R_4SDpL6f4IGHo2mH,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_3,10,Improve chattr,NA
+R_4SDpL6f4IGHo2mH,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_4,80,Cost-sensitive learning,NA
+R_4SDpL6f4IGHo2mH,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_5,0,Stacking ensembles,NA
+R_4SDpL6f4IGHo2mH,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_6,0,Spatial machine learning ,NA
+R_4SDpL6f4IGHo2mH,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_10,0,Ordinal regression,NA
+R_4SDpL6f4IGHo2mH,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_12,0,Other,NA
+R_63ZXISYmiPFBuRn,I have used tidymodels packages many times,I work in industry,Q5_1,10,Sparse tibbles,NA
+R_63ZXISYmiPFBuRn,I have used tidymodels packages many times,I work in industry,Q5_2,60,Causal inference,NA
+R_63ZXISYmiPFBuRn,I have used tidymodels packages many times,I work in industry,Q5_3,0,Improve chattr,NA
+R_63ZXISYmiPFBuRn,I have used tidymodels packages many times,I work in industry,Q5_4,20,Cost-sensitive learning,NA
+R_63ZXISYmiPFBuRn,I have used tidymodels packages many times,I work in industry,Q5_5,0,Stacking ensembles,NA
+R_63ZXISYmiPFBuRn,I have used tidymodels packages many times,I work in industry,Q5_6,10,Spatial machine learning ,NA
+R_63ZXISYmiPFBuRn,I have used tidymodels packages many times,I work in industry,Q5_10,0,Ordinal regression,NA
+R_63ZXISYmiPFBuRn,I have used tidymodels packages many times,I work in industry,Q5_12,0,Other,NA
+R_85vznnXpzsIWpMw,I have used tidymodels packages a few times,I work in industry,Q5_1,30,Sparse tibbles,NA
+R_85vznnXpzsIWpMw,I have used tidymodels packages a few times,I work in industry,Q5_2,0,Causal inference,NA
+R_85vznnXpzsIWpMw,I have used tidymodels packages a few times,I work in industry,Q5_3,20,Improve chattr,NA
+R_85vznnXpzsIWpMw,I have used tidymodels packages a few times,I work in industry,Q5_4,50,Cost-sensitive learning,NA
+R_85vznnXpzsIWpMw,I have used tidymodels packages a few times,I work in industry,Q5_5,0,Stacking ensembles,NA
+R_85vznnXpzsIWpMw,I have used tidymodels packages a few times,I work in industry,Q5_6,0,Spatial machine learning ,NA
+R_85vznnXpzsIWpMw,I have used tidymodels packages a few times,I work in industry,Q5_10,0,Ordinal regression,NA
+R_85vznnXpzsIWpMw,I have used tidymodels packages a few times,I work in industry,Q5_12,0,Other,NA
+R_2nUaERyP6GinuhL,I have used tidymodels packages many times,I work in industry,Q5_1,10,Sparse tibbles,NA
+R_2nUaERyP6GinuhL,I have used tidymodels packages many times,I work in industry,Q5_2,40,Causal inference,NA
+R_2nUaERyP6GinuhL,I have used tidymodels packages many times,I work in industry,Q5_3,0,Improve chattr,NA
+R_2nUaERyP6GinuhL,I have used tidymodels packages many times,I work in industry,Q5_4,0,Cost-sensitive learning,NA
+R_2nUaERyP6GinuhL,I have used tidymodels packages many times,I work in industry,Q5_5,30,Stacking ensembles,NA
+R_2nUaERyP6GinuhL,I have used tidymodels packages many times,I work in industry,Q5_6,20,Spatial machine learning ,NA
+R_2nUaERyP6GinuhL,I have used tidymodels packages many times,I work in industry,Q5_10,0,Ordinal regression,NA
+R_2nUaERyP6GinuhL,I have used tidymodels packages many times,I work in industry,Q5_12,0,Other,NA
+R_1lykcTbjLwIM3by,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_1,30,Sparse tibbles,NA
+R_1lykcTbjLwIM3by,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_2,10,Causal inference,NA
+R_1lykcTbjLwIM3by,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_3,0,Improve chattr,NA
+R_1lykcTbjLwIM3by,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_4,10,Cost-sensitive learning,NA
+R_1lykcTbjLwIM3by,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_5,10,Stacking ensembles,NA
+R_1lykcTbjLwIM3by,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_6,40,Spatial machine learning ,NA
+R_1lykcTbjLwIM3by,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_10,0,Ordinal regression,NA
+R_1lykcTbjLwIM3by,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_12,0,Other,NA
+R_1cRra1EOIeDRLnH,I have used tidymodels packages many times,I work in industry,Q5_1,5,Sparse tibbles,NA
+R_1cRra1EOIeDRLnH,I have used tidymodels packages many times,I work in industry,Q5_2,50,Causal inference,NA
+R_1cRra1EOIeDRLnH,I have used tidymodels packages many times,I work in industry,Q5_3,10,Improve chattr,NA
+R_1cRra1EOIeDRLnH,I have used tidymodels packages many times,I work in industry,Q5_4,10,Cost-sensitive learning,NA
+R_1cRra1EOIeDRLnH,I have used tidymodels packages many times,I work in industry,Q5_5,10,Stacking ensembles,NA
+R_1cRra1EOIeDRLnH,I have used tidymodels packages many times,I work in industry,Q5_6,10,Spatial machine learning ,NA
+R_1cRra1EOIeDRLnH,I have used tidymodels packages many times,I work in industry,Q5_10,5,Ordinal regression,NA
+R_1cRra1EOIeDRLnH,I have used tidymodels packages many times,I work in industry,Q5_12,0,Other,NA
+R_1R20QZpIDHyLvhW,I have contributed to tidymodels packages or taught others how to use them,I am a student,Q5_1,0,Sparse tibbles,NA
+R_1R20QZpIDHyLvhW,I have contributed to tidymodels packages or taught others how to use them,I am a student,Q5_2,50,Causal inference,NA
+R_1R20QZpIDHyLvhW,I have contributed to tidymodels packages or taught others how to use them,I am a student,Q5_3,0,Improve chattr,NA
+R_1R20QZpIDHyLvhW,I have contributed to tidymodels packages or taught others how to use them,I am a student,Q5_4,20,Cost-sensitive learning,NA
+R_1R20QZpIDHyLvhW,I have contributed to tidymodels packages or taught others how to use them,I am a student,Q5_5,10,Stacking ensembles,NA
+R_1R20QZpIDHyLvhW,I have contributed to tidymodels packages or taught others how to use them,I am a student,Q5_6,0,Spatial machine learning ,NA
+R_1R20QZpIDHyLvhW,I have contributed to tidymodels packages or taught others how to use them,I am a student,Q5_10,20,Ordinal regression,NA
+R_1R20QZpIDHyLvhW,I have contributed to tidymodels packages or taught others how to use them,I am a student,Q5_12,0,Other,NA
+R_6arfNu4PX3vWZCf,I have used tidymodels packages many times,I work in industry,Q5_1,50,Sparse tibbles,NA
+R_6arfNu4PX3vWZCf,I have used tidymodels packages many times,I work in industry,Q5_2,10,Causal inference,NA
+R_6arfNu4PX3vWZCf,I have used tidymodels packages many times,I work in industry,Q5_3,20,Improve chattr,NA
+R_6arfNu4PX3vWZCf,I have used tidymodels packages many times,I work in industry,Q5_4,0,Cost-sensitive learning,NA
+R_6arfNu4PX3vWZCf,I have used tidymodels packages many times,I work in industry,Q5_5,0,Stacking ensembles,NA
+R_6arfNu4PX3vWZCf,I have used tidymodels packages many times,I work in industry,Q5_6,0,Spatial machine learning ,NA
+R_6arfNu4PX3vWZCf,I have used tidymodels packages many times,I work in industry,Q5_10,20,Ordinal regression,NA
+R_6arfNu4PX3vWZCf,I have used tidymodels packages many times,I work in industry,Q5_12,0,Other,NA
+R_4OrkPeIhnfVHbEd,I have used tidymodels packages many times,I work in industry,Q5_1,0,Sparse tibbles,NA
+R_4OrkPeIhnfVHbEd,I have used tidymodels packages many times,I work in industry,Q5_2,20,Causal inference,NA
+R_4OrkPeIhnfVHbEd,I have used tidymodels packages many times,I work in industry,Q5_3,0,Improve chattr,NA
+R_4OrkPeIhnfVHbEd,I have used tidymodels packages many times,I work in industry,Q5_4,80,Cost-sensitive learning,NA
+R_4OrkPeIhnfVHbEd,I have used tidymodels packages many times,I work in industry,Q5_5,0,Stacking ensembles,NA
+R_4OrkPeIhnfVHbEd,I have used tidymodels packages many times,I work in industry,Q5_6,0,Spatial machine learning ,NA
+R_4OrkPeIhnfVHbEd,I have used tidymodels packages many times,I work in industry,Q5_10,0,Ordinal regression,NA
+R_4OrkPeIhnfVHbEd,I have used tidymodels packages many times,I work in industry,Q5_12,0,Other,NA
+R_1tv4F4jElQjQuUF,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_1,0,Sparse tibbles,NA
+R_1tv4F4jElQjQuUF,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_2,0,Causal inference,NA
+R_1tv4F4jElQjQuUF,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_3,0,Improve chattr,NA
+R_1tv4F4jElQjQuUF,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_4,0,Cost-sensitive learning,NA
+R_1tv4F4jElQjQuUF,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_5,50,Stacking ensembles,NA
+R_1tv4F4jElQjQuUF,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_6,50,Spatial machine learning ,NA
+R_1tv4F4jElQjQuUF,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_10,0,Ordinal regression,NA
+R_1tv4F4jElQjQuUF,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_12,0,Other,NA
+R_4fP5fSTE2EjwT0L,I have used tidymodels packages many times,I work in industry,Q5_1,0,Sparse tibbles,NA
+R_4fP5fSTE2EjwT0L,I have used tidymodels packages many times,I work in industry,Q5_2,50,Causal inference,NA
+R_4fP5fSTE2EjwT0L,I have used tidymodels packages many times,I work in industry,Q5_3,0,Improve chattr,NA
+R_4fP5fSTE2EjwT0L,I have used tidymodels packages many times,I work in industry,Q5_4,10,Cost-sensitive learning,NA
+R_4fP5fSTE2EjwT0L,I have used tidymodels packages many times,I work in industry,Q5_5,0,Stacking ensembles,NA
+R_4fP5fSTE2EjwT0L,I have used tidymodels packages many times,I work in industry,Q5_6,15,Spatial machine learning ,NA
+R_4fP5fSTE2EjwT0L,I have used tidymodels packages many times,I work in industry,Q5_10,25,Ordinal regression,NA
+R_4fP5fSTE2EjwT0L,I have used tidymodels packages many times,I work in industry,Q5_12,0,Other,NA
+R_5qboxV4dv6Vtokx,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_1,0,Sparse tibbles,NA
+R_5qboxV4dv6Vtokx,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_2,25,Causal inference,NA
+R_5qboxV4dv6Vtokx,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_3,50,Improve chattr,NA
+R_5qboxV4dv6Vtokx,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_4,0,Cost-sensitive learning,NA
+R_5qboxV4dv6Vtokx,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_5,25,Stacking ensembles,NA
+R_5qboxV4dv6Vtokx,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_6,0,Spatial machine learning ,NA
+R_5qboxV4dv6Vtokx,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_10,0,Ordinal regression,NA
+R_5qboxV4dv6Vtokx,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_12,0,Other,NA
+R_6yPRMg4ylkNNgch,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_1,0,Sparse tibbles,NA
+R_6yPRMg4ylkNNgch,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_2,50,Causal inference,NA
+R_6yPRMg4ylkNNgch,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_3,0,Improve chattr,NA
+R_6yPRMg4ylkNNgch,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_4,0,Cost-sensitive learning,NA
+R_6yPRMg4ylkNNgch,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_5,40,Stacking ensembles,NA
+R_6yPRMg4ylkNNgch,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_6,5,Spatial machine learning ,NA
+R_6yPRMg4ylkNNgch,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_10,5,Ordinal regression,NA
+R_6yPRMg4ylkNNgch,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_12,0,Other,NA
+R_1s5M4AI5uaN6Alz,I have used tidymodels packages a few times,I am a student,Q5_1,0,Sparse tibbles,NA
+R_1s5M4AI5uaN6Alz,I have used tidymodels packages a few times,I am a student,Q5_2,60,Causal inference,NA
+R_1s5M4AI5uaN6Alz,I have used tidymodels packages a few times,I am a student,Q5_3,0,Improve chattr,NA
+R_1s5M4AI5uaN6Alz,I have used tidymodels packages a few times,I am a student,Q5_4,0,Cost-sensitive learning,NA
+R_1s5M4AI5uaN6Alz,I have used tidymodels packages a few times,I am a student,Q5_5,20,Stacking ensembles,NA
+R_1s5M4AI5uaN6Alz,I have used tidymodels packages a few times,I am a student,Q5_6,20,Spatial machine learning ,NA
+R_1s5M4AI5uaN6Alz,I have used tidymodels packages a few times,I am a student,Q5_10,0,Ordinal regression,NA
+R_1s5M4AI5uaN6Alz,I have used tidymodels packages a few times,I am a student,Q5_12,0,Other,NA
+R_5HSIXETxf6YIV7b,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_1,10,Sparse tibbles,NA
+R_5HSIXETxf6YIV7b,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_2,80,Causal inference,NA
+R_5HSIXETxf6YIV7b,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_3,0,Improve chattr,NA
+R_5HSIXETxf6YIV7b,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_4,0,Cost-sensitive learning,NA
+R_5HSIXETxf6YIV7b,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_5,0,Stacking ensembles,NA
+R_5HSIXETxf6YIV7b,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_6,10,Spatial machine learning ,NA
+R_5HSIXETxf6YIV7b,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_10,0,Ordinal regression,NA
+R_5HSIXETxf6YIV7b,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_12,0,Other,NA
+R_7CfaDxapiVF2E2e,I have contributed to tidymodels packages or taught others how to use them,"I am an academic, professor, and/or researcher",Q5_1,29,Sparse tibbles,NA
+R_7CfaDxapiVF2E2e,I have contributed to tidymodels packages or taught others how to use them,"I am an academic, professor, and/or researcher",Q5_2,10,Causal inference,NA
+R_7CfaDxapiVF2E2e,I have contributed to tidymodels packages or taught others how to use them,"I am an academic, professor, and/or researcher",Q5_3,0,Improve chattr,NA
+R_7CfaDxapiVF2E2e,I have contributed to tidymodels packages or taught others how to use them,"I am an academic, professor, and/or researcher",Q5_4,10,Cost-sensitive learning,NA
+R_7CfaDxapiVF2E2e,I have contributed to tidymodels packages or taught others how to use them,"I am an academic, professor, and/or researcher",Q5_5,10,Stacking ensembles,NA
+R_7CfaDxapiVF2E2e,I have contributed to tidymodels packages or taught others how to use them,"I am an academic, professor, and/or researcher",Q5_6,1,Spatial machine learning ,NA
+R_7CfaDxapiVF2E2e,I have contributed to tidymodels packages or taught others how to use them,"I am an academic, professor, and/or researcher",Q5_10,10,Ordinal regression,NA
+R_7CfaDxapiVF2E2e,I have contributed to tidymodels packages or taught others how to use them,"I am an academic, professor, and/or researcher",Q5_12,30,Other,more integrations with time series (model time)
+R_7qDb4iGAUerVCfw,I have used tidymodels packages many times,I work in industry,Q5_1,20,Sparse tibbles,NA
+R_7qDb4iGAUerVCfw,I have used tidymodels packages many times,I work in industry,Q5_2,20,Causal inference,NA
+R_7qDb4iGAUerVCfw,I have used tidymodels packages many times,I work in industry,Q5_3,0,Improve chattr,NA
+R_7qDb4iGAUerVCfw,I have used tidymodels packages many times,I work in industry,Q5_4,10,Cost-sensitive learning,NA
+R_7qDb4iGAUerVCfw,I have used tidymodels packages many times,I work in industry,Q5_5,40,Stacking ensembles,NA
+R_7qDb4iGAUerVCfw,I have used tidymodels packages many times,I work in industry,Q5_6,0,Spatial machine learning ,NA
+R_7qDb4iGAUerVCfw,I have used tidymodels packages many times,I work in industry,Q5_10,10,Ordinal regression,NA
+R_7qDb4iGAUerVCfw,I have used tidymodels packages many times,I work in industry,Q5_12,0,Other,NA
+R_1r1wl1ZeenyaerL,I have used tidymodels packages many times,I work in industry,Q5_1,10,Sparse tibbles,NA
+R_1r1wl1ZeenyaerL,I have used tidymodels packages many times,I work in industry,Q5_2,0,Causal inference,NA
+R_1r1wl1ZeenyaerL,I have used tidymodels packages many times,I work in industry,Q5_3,0,Improve chattr,NA
+R_1r1wl1ZeenyaerL,I have used tidymodels packages many times,I work in industry,Q5_4,10,Cost-sensitive learning,NA
+R_1r1wl1ZeenyaerL,I have used tidymodels packages many times,I work in industry,Q5_5,0,Stacking ensembles,NA
+R_1r1wl1ZeenyaerL,I have used tidymodels packages many times,I work in industry,Q5_6,0,Spatial machine learning ,NA
+R_1r1wl1ZeenyaerL,I have used tidymodels packages many times,I work in industry,Q5_10,30,Ordinal regression,NA
+R_1r1wl1ZeenyaerL,I have used tidymodels packages many times,I work in industry,Q5_12,50,Other,multi-task learning models (multi-label classification/regression)
+R_7sYgKpwjM0RTAEF,I have used tidymodels packages many times,I work in industry,Q5_1,0,Sparse tibbles,NA
+R_7sYgKpwjM0RTAEF,I have used tidymodels packages many times,I work in industry,Q5_2,100,Causal inference,NA
+R_7sYgKpwjM0RTAEF,I have used tidymodels packages many times,I work in industry,Q5_3,0,Improve chattr,NA
+R_7sYgKpwjM0RTAEF,I have used tidymodels packages many times,I work in industry,Q5_4,0,Cost-sensitive learning,NA
+R_7sYgKpwjM0RTAEF,I have used tidymodels packages many times,I work in industry,Q5_5,0,Stacking ensembles,NA
+R_7sYgKpwjM0RTAEF,I have used tidymodels packages many times,I work in industry,Q5_6,0,Spatial machine learning ,NA
+R_7sYgKpwjM0RTAEF,I have used tidymodels packages many times,I work in industry,Q5_10,0,Ordinal regression,NA
+R_7sYgKpwjM0RTAEF,I have used tidymodels packages many times,I work in industry,Q5_12,0,Other,NA
+R_72fiLWX8qponvO4,I have used tidymodels packages many times,I work in industry,Q5_1,0,Sparse tibbles,NA
+R_72fiLWX8qponvO4,I have used tidymodels packages many times,I work in industry,Q5_2,0,Causal inference,NA
+R_72fiLWX8qponvO4,I have used tidymodels packages many times,I work in industry,Q5_3,0,Improve chattr,NA
+R_72fiLWX8qponvO4,I have used tidymodels packages many times,I work in industry,Q5_4,0,Cost-sensitive learning,NA
+R_72fiLWX8qponvO4,I have used tidymodels packages many times,I work in industry,Q5_5,0,Stacking ensembles,NA
+R_72fiLWX8qponvO4,I have used tidymodels packages many times,I work in industry,Q5_6,0,Spatial machine learning ,NA
+R_72fiLWX8qponvO4,I have used tidymodels packages many times,I work in industry,Q5_10,0,Ordinal regression,NA
+R_72fiLWX8qponvO4,I have used tidymodels packages many times,I work in industry,Q5_12,100,Other,Quantile regression
+R_5fpoamT6nHjkjHl,I have contributed to tidymodels packages or taught others how to use them,"I am an academic, professor, and/or researcher",Q5_1,0,Sparse tibbles,NA
+R_5fpoamT6nHjkjHl,I have contributed to tidymodels packages or taught others how to use them,"I am an academic, professor, and/or researcher",Q5_2,5,Causal inference,NA
+R_5fpoamT6nHjkjHl,I have contributed to tidymodels packages or taught others how to use them,"I am an academic, professor, and/or researcher",Q5_3,5,Improve chattr,NA
+R_5fpoamT6nHjkjHl,I have contributed to tidymodels packages or taught others how to use them,"I am an academic, professor, and/or researcher",Q5_4,0,Cost-sensitive learning,NA
+R_5fpoamT6nHjkjHl,I have contributed to tidymodels packages or taught others how to use them,"I am an academic, professor, and/or researcher",Q5_5,5,Stacking ensembles,NA
+R_5fpoamT6nHjkjHl,I have contributed to tidymodels packages or taught others how to use them,"I am an academic, professor, and/or researcher",Q5_6,85,Spatial machine learning ,NA
+R_5fpoamT6nHjkjHl,I have contributed to tidymodels packages or taught others how to use them,"I am an academic, professor, and/or researcher",Q5_10,0,Ordinal regression,NA
+R_5fpoamT6nHjkjHl,I have contributed to tidymodels packages or taught others how to use them,"I am an academic, professor, and/or researcher",Q5_12,0,Other,NA
+R_6lMdo4vlE3jQVwJ,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_1,15,Sparse tibbles,NA
+R_6lMdo4vlE3jQVwJ,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_2,10,Causal inference,NA
+R_6lMdo4vlE3jQVwJ,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_3,20,Improve chattr,NA
+R_6lMdo4vlE3jQVwJ,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_4,20,Cost-sensitive learning,NA
+R_6lMdo4vlE3jQVwJ,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_5,15,Stacking ensembles,NA
+R_6lMdo4vlE3jQVwJ,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_6,20,Spatial machine learning ,NA
+R_6lMdo4vlE3jQVwJ,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_10,0,Ordinal regression,NA
+R_6lMdo4vlE3jQVwJ,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_12,0,Other,NA
+R_5KwELhEAfNyGXqQ,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_1,5,Sparse tibbles,NA
+R_5KwELhEAfNyGXqQ,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_2,5,Causal inference,NA
+R_5KwELhEAfNyGXqQ,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_3,40,Improve chattr,NA
+R_5KwELhEAfNyGXqQ,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_4,40,Cost-sensitive learning,NA
+R_5KwELhEAfNyGXqQ,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_5,10,Stacking ensembles,NA
+R_5KwELhEAfNyGXqQ,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_6,0,Spatial machine learning ,NA
+R_5KwELhEAfNyGXqQ,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_10,0,Ordinal regression,NA
+R_5KwELhEAfNyGXqQ,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_12,0,Other,NA
+R_6BEurI59ikagOxr,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_1,0,Sparse tibbles,NA
+R_6BEurI59ikagOxr,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_2,0,Causal inference,NA
+R_6BEurI59ikagOxr,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_3,0,Improve chattr,NA
+R_6BEurI59ikagOxr,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_4,0,Cost-sensitive learning,NA
+R_6BEurI59ikagOxr,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_5,0,Stacking ensembles,NA
+R_6BEurI59ikagOxr,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_6,0,Spatial machine learning ,NA
+R_6BEurI59ikagOxr,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_10,0,Ordinal regression,NA
+R_6BEurI59ikagOxr,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_12,100,Other,Support for {brms} and pharmacometrics suites of packages such as {nlmixr2}
+R_3odmJKUQN4SVBa0,I have used tidymodels packages many times,I work in industry,Q5_1,20,Sparse tibbles,NA
+R_3odmJKUQN4SVBa0,I have used tidymodels packages many times,I work in industry,Q5_2,80,Causal inference,NA
+R_3odmJKUQN4SVBa0,I have used tidymodels packages many times,I work in industry,Q5_3,0,Improve chattr,NA
+R_3odmJKUQN4SVBa0,I have used tidymodels packages many times,I work in industry,Q5_4,0,Cost-sensitive learning,NA
+R_3odmJKUQN4SVBa0,I have used tidymodels packages many times,I work in industry,Q5_5,0,Stacking ensembles,NA
+R_3odmJKUQN4SVBa0,I have used tidymodels packages many times,I work in industry,Q5_6,0,Spatial machine learning ,NA
+R_3odmJKUQN4SVBa0,I have used tidymodels packages many times,I work in industry,Q5_10,0,Ordinal regression,NA
+R_3odmJKUQN4SVBa0,I have used tidymodels packages many times,I work in industry,Q5_12,0,Other,NA
+R_5d6RGf3SKkXXJIA,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_1,0,Sparse tibbles,NA
+R_5d6RGf3SKkXXJIA,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_2,30,Causal inference,NA
+R_5d6RGf3SKkXXJIA,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_3,0,Improve chattr,NA
+R_5d6RGf3SKkXXJIA,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_4,0,Cost-sensitive learning,NA
+R_5d6RGf3SKkXXJIA,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_5,20,Stacking ensembles,NA
+R_5d6RGf3SKkXXJIA,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_6,50,Spatial machine learning ,NA
+R_5d6RGf3SKkXXJIA,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_10,0,Ordinal regression,NA
+R_5d6RGf3SKkXXJIA,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_12,0,Other,NA
+R_3oL7RX0toC6fBjf,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_1,0,Sparse tibbles,NA
+R_3oL7RX0toC6fBjf,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_2,30,Causal inference,NA
+R_3oL7RX0toC6fBjf,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_3,30,Improve chattr,NA
+R_3oL7RX0toC6fBjf,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_4,0,Cost-sensitive learning,NA
+R_3oL7RX0toC6fBjf,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_5,10,Stacking ensembles,NA
+R_3oL7RX0toC6fBjf,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_6,30,Spatial machine learning ,NA
+R_3oL7RX0toC6fBjf,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_10,0,Ordinal regression,NA
+R_3oL7RX0toC6fBjf,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_12,0,Other,NA
+R_5yOBUEHdlemfIc1,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_1,10,Sparse tibbles,NA
+R_5yOBUEHdlemfIc1,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_2,20,Causal inference,NA
+R_5yOBUEHdlemfIc1,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_3,20,Improve chattr,NA
+R_5yOBUEHdlemfIc1,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_4,20,Cost-sensitive learning,NA
+R_5yOBUEHdlemfIc1,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_5,10,Stacking ensembles,NA
+R_5yOBUEHdlemfIc1,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_6,0,Spatial machine learning ,NA
+R_5yOBUEHdlemfIc1,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_10,20,Ordinal regression,NA
+R_5yOBUEHdlemfIc1,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_12,0,Other,NA
+R_4j6W9gKHQmJHUKB,I have used tidymodels packages a few times,I work in industry,Q5_1,0,Sparse tibbles,NA
+R_4j6W9gKHQmJHUKB,I have used tidymodels packages a few times,I work in industry,Q5_2,30,Causal inference,NA
+R_4j6W9gKHQmJHUKB,I have used tidymodels packages a few times,I work in industry,Q5_3,0,Improve chattr,NA
+R_4j6W9gKHQmJHUKB,I have used tidymodels packages a few times,I work in industry,Q5_4,50,Cost-sensitive learning,NA
+R_4j6W9gKHQmJHUKB,I have used tidymodels packages a few times,I work in industry,Q5_5,0,Stacking ensembles,NA
+R_4j6W9gKHQmJHUKB,I have used tidymodels packages a few times,I work in industry,Q5_6,0,Spatial machine learning ,NA
+R_4j6W9gKHQmJHUKB,I have used tidymodels packages a few times,I work in industry,Q5_10,20,Ordinal regression,NA
+R_4j6W9gKHQmJHUKB,I have used tidymodels packages a few times,I work in industry,Q5_12,0,Other,NA
+R_31t8bHyx15T4Q7b,I have used tidymodels packages many times,I work in industry,Q5_1,0,Sparse tibbles,NA
+R_31t8bHyx15T4Q7b,I have used tidymodels packages many times,I work in industry,Q5_2,60,Causal inference,NA
+R_31t8bHyx15T4Q7b,I have used tidymodels packages many times,I work in industry,Q5_3,10,Improve chattr,NA
+R_31t8bHyx15T4Q7b,I have used tidymodels packages many times,I work in industry,Q5_4,0,Cost-sensitive learning,NA
+R_31t8bHyx15T4Q7b,I have used tidymodels packages many times,I work in industry,Q5_5,20,Stacking ensembles,NA
+R_31t8bHyx15T4Q7b,I have used tidymodels packages many times,I work in industry,Q5_6,10,Spatial machine learning ,NA
+R_31t8bHyx15T4Q7b,I have used tidymodels packages many times,I work in industry,Q5_10,0,Ordinal regression,NA
+R_31t8bHyx15T4Q7b,I have used tidymodels packages many times,I work in industry,Q5_12,0,Other,NA
+R_3o0VRKBoOGWRioN,I have used tidymodels packages a few times,I work in industry,Q5_1,10,Sparse tibbles,NA
+R_3o0VRKBoOGWRioN,I have used tidymodels packages a few times,I work in industry,Q5_2,25,Causal inference,NA
+R_3o0VRKBoOGWRioN,I have used tidymodels packages a few times,I work in industry,Q5_3,10,Improve chattr,NA
+R_3o0VRKBoOGWRioN,I have used tidymodels packages a few times,I work in industry,Q5_4,25,Cost-sensitive learning,NA
+R_3o0VRKBoOGWRioN,I have used tidymodels packages a few times,I work in industry,Q5_5,10,Stacking ensembles,NA
+R_3o0VRKBoOGWRioN,I have used tidymodels packages a few times,I work in industry,Q5_6,10,Spatial machine learning ,NA
+R_3o0VRKBoOGWRioN,I have used tidymodels packages a few times,I work in industry,Q5_10,10,Ordinal regression,NA
+R_3o0VRKBoOGWRioN,I have used tidymodels packages a few times,I work in industry,Q5_12,0,Other,NA
+R_3HhroasMyRANwKB,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_1,30,Sparse tibbles,NA
+R_3HhroasMyRANwKB,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_2,0,Causal inference,NA
+R_3HhroasMyRANwKB,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_3,0,Improve chattr,NA
+R_3HhroasMyRANwKB,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_4,0,Cost-sensitive learning,NA
+R_3HhroasMyRANwKB,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_5,15,Stacking ensembles,NA
+R_3HhroasMyRANwKB,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_6,0,Spatial machine learning ,NA
+R_3HhroasMyRANwKB,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_10,0,Ordinal regression,NA
+R_3HhroasMyRANwKB,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_12,55,Other,Out of memory processing
+R_77ObyuwJie8qdi1,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_1,8,Sparse tibbles,NA
+R_77ObyuwJie8qdi1,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_2,62,Causal inference,NA
+R_77ObyuwJie8qdi1,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_3,10,Improve chattr,NA
+R_77ObyuwJie8qdi1,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_4,5,Cost-sensitive learning,NA
+R_77ObyuwJie8qdi1,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_5,3,Stacking ensembles,NA
+R_77ObyuwJie8qdi1,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_6,2,Spatial machine learning ,NA
+R_77ObyuwJie8qdi1,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_10,10,Ordinal regression,NA
+R_77ObyuwJie8qdi1,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_12,0,Other,NA
+R_7iEiCtxH4KKXMVH,I have used tidymodels packages many times,I work in industry,Q5_1,25,Sparse tibbles,NA
+R_7iEiCtxH4KKXMVH,I have used tidymodels packages many times,I work in industry,Q5_2,25,Causal inference,NA
+R_7iEiCtxH4KKXMVH,I have used tidymodels packages many times,I work in industry,Q5_3,5,Improve chattr,NA
+R_7iEiCtxH4KKXMVH,I have used tidymodels packages many times,I work in industry,Q5_4,5,Cost-sensitive learning,NA
+R_7iEiCtxH4KKXMVH,I have used tidymodels packages many times,I work in industry,Q5_5,20,Stacking ensembles,NA
+R_7iEiCtxH4KKXMVH,I have used tidymodels packages many times,I work in industry,Q5_6,0,Spatial machine learning ,NA
+R_7iEiCtxH4KKXMVH,I have used tidymodels packages many times,I work in industry,Q5_10,10,Ordinal regression,NA
+R_7iEiCtxH4KKXMVH,I have used tidymodels packages many times,I work in industry,Q5_12,10,Other,Quantile regression
+R_7qU2U2c1NDzYNYD,I have used tidymodels packages many times,I work in industry,Q5_1,10,Sparse tibbles,NA
+R_7qU2U2c1NDzYNYD,I have used tidymodels packages many times,I work in industry,Q5_2,35,Causal inference,NA
+R_7qU2U2c1NDzYNYD,I have used tidymodels packages many times,I work in industry,Q5_3,10,Improve chattr,NA
+R_7qU2U2c1NDzYNYD,I have used tidymodels packages many times,I work in industry,Q5_4,10,Cost-sensitive learning,NA
+R_7qU2U2c1NDzYNYD,I have used tidymodels packages many times,I work in industry,Q5_5,15,Stacking ensembles,NA
+R_7qU2U2c1NDzYNYD,I have used tidymodels packages many times,I work in industry,Q5_6,10,Spatial machine learning ,NA
+R_7qU2U2c1NDzYNYD,I have used tidymodels packages many times,I work in industry,Q5_10,10,Ordinal regression,NA
+R_7qU2U2c1NDzYNYD,I have used tidymodels packages many times,I work in industry,Q5_12,0,Other,NA
+R_3yRLEfUASAkCBsl,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_1,0,Sparse tibbles,NA
+R_3yRLEfUASAkCBsl,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_2,0,Causal inference,NA
+R_3yRLEfUASAkCBsl,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_3,20,Improve chattr,NA
+R_3yRLEfUASAkCBsl,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_4,0,Cost-sensitive learning,NA
+R_3yRLEfUASAkCBsl,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_5,20,Stacking ensembles,NA
+R_3yRLEfUASAkCBsl,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_6,0,Spatial machine learning ,NA
+R_3yRLEfUASAkCBsl,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_10,20,Ordinal regression,NA
+R_3yRLEfUASAkCBsl,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_12,40,Other,Very fast lasso penalized regression / fast OLS
+R_82y1sm9hAK1VMpv,I have used tidymodels packages a few times,I am a hobbyist,Q5_1,0,Sparse tibbles,NA
+R_82y1sm9hAK1VMpv,I have used tidymodels packages a few times,I am a hobbyist,Q5_2,0,Causal inference,NA
+R_82y1sm9hAK1VMpv,I have used tidymodels packages a few times,I am a hobbyist,Q5_3,0,Improve chattr,NA
+R_82y1sm9hAK1VMpv,I have used tidymodels packages a few times,I am a hobbyist,Q5_4,20,Cost-sensitive learning,NA
+R_82y1sm9hAK1VMpv,I have used tidymodels packages a few times,I am a hobbyist,Q5_5,70,Stacking ensembles,NA
+R_82y1sm9hAK1VMpv,I have used tidymodels packages a few times,I am a hobbyist,Q5_6,0,Spatial machine learning ,NA
+R_82y1sm9hAK1VMpv,I have used tidymodels packages a few times,I am a hobbyist,Q5_10,10,Ordinal regression,NA
+R_82y1sm9hAK1VMpv,I have used tidymodels packages a few times,I am a hobbyist,Q5_12,0,Other,NA
+R_6WO5MHV1NyUGXvp,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_1,0,Sparse tibbles,NA
+R_6WO5MHV1NyUGXvp,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_2,0,Causal inference,NA
+R_6WO5MHV1NyUGXvp,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_3,0,Improve chattr,NA
+R_6WO5MHV1NyUGXvp,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_4,0,Cost-sensitive learning,NA
+R_6WO5MHV1NyUGXvp,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_5,0,Stacking ensembles,NA
+R_6WO5MHV1NyUGXvp,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_6,100,Spatial machine learning ,NA
+R_6WO5MHV1NyUGXvp,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_10,0,Ordinal regression,NA
+R_6WO5MHV1NyUGXvp,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_12,0,Other,NA
+R_5EKD0sk5mTwliVJ,I have used tidymodels packages many times,I work in industry,Q5_1,0,Sparse tibbles,NA
+R_5EKD0sk5mTwliVJ,I have used tidymodels packages many times,I work in industry,Q5_2,40,Causal inference,NA
+R_5EKD0sk5mTwliVJ,I have used tidymodels packages many times,I work in industry,Q5_3,0,Improve chattr,NA
+R_5EKD0sk5mTwliVJ,I have used tidymodels packages many times,I work in industry,Q5_4,35,Cost-sensitive learning,NA
+R_5EKD0sk5mTwliVJ,I have used tidymodels packages many times,I work in industry,Q5_5,25,Stacking ensembles,NA
+R_5EKD0sk5mTwliVJ,I have used tidymodels packages many times,I work in industry,Q5_6,0,Spatial machine learning ,NA
+R_5EKD0sk5mTwliVJ,I have used tidymodels packages many times,I work in industry,Q5_10,0,Ordinal regression,NA
+R_5EKD0sk5mTwliVJ,I have used tidymodels packages many times,I work in industry,Q5_12,0,Other,NA
+R_4QyTuc4RmDJp4Dh,I have used tidymodels packages many times,I work in industry,Q5_1,10,Sparse tibbles,NA
+R_4QyTuc4RmDJp4Dh,I have used tidymodels packages many times,I work in industry,Q5_2,30,Causal inference,NA
+R_4QyTuc4RmDJp4Dh,I have used tidymodels packages many times,I work in industry,Q5_3,20,Improve chattr,NA
+R_4QyTuc4RmDJp4Dh,I have used tidymodels packages many times,I work in industry,Q5_4,10,Cost-sensitive learning,NA
+R_4QyTuc4RmDJp4Dh,I have used tidymodels packages many times,I work in industry,Q5_5,15,Stacking ensembles,NA
+R_4QyTuc4RmDJp4Dh,I have used tidymodels packages many times,I work in industry,Q5_6,10,Spatial machine learning ,NA
+R_4QyTuc4RmDJp4Dh,I have used tidymodels packages many times,I work in industry,Q5_10,5,Ordinal regression,NA
+R_4QyTuc4RmDJp4Dh,I have used tidymodels packages many times,I work in industry,Q5_12,0,Other,NA
+R_3GlmBo01PYlO2aX,I have used tidymodels packages many times,I work in industry,Q5_1,0,Sparse tibbles,NA
+R_3GlmBo01PYlO2aX,I have used tidymodels packages many times,I work in industry,Q5_2,85,Causal inference,NA
+R_3GlmBo01PYlO2aX,I have used tidymodels packages many times,I work in industry,Q5_3,5,Improve chattr,NA
+R_3GlmBo01PYlO2aX,I have used tidymodels packages many times,I work in industry,Q5_4,0,Cost-sensitive learning,NA
+R_3GlmBo01PYlO2aX,I have used tidymodels packages many times,I work in industry,Q5_5,5,Stacking ensembles,NA
+R_3GlmBo01PYlO2aX,I have used tidymodels packages many times,I work in industry,Q5_6,0,Spatial machine learning ,NA
+R_3GlmBo01PYlO2aX,I have used tidymodels packages many times,I work in industry,Q5_10,5,Ordinal regression,NA
+R_3GlmBo01PYlO2aX,I have used tidymodels packages many times,I work in industry,Q5_12,0,Other,NA
+R_6dmkWnQQPsqTx9Y,I have used tidymodels packages many times,I work in industry,Q5_1,10,Sparse tibbles,NA
+R_6dmkWnQQPsqTx9Y,I have used tidymodels packages many times,I work in industry,Q5_2,0,Causal inference,NA
+R_6dmkWnQQPsqTx9Y,I have used tidymodels packages many times,I work in industry,Q5_3,0,Improve chattr,NA
+R_6dmkWnQQPsqTx9Y,I have used tidymodels packages many times,I work in industry,Q5_4,0,Cost-sensitive learning,NA
+R_6dmkWnQQPsqTx9Y,I have used tidymodels packages many times,I work in industry,Q5_5,90,Stacking ensembles,NA
+R_6dmkWnQQPsqTx9Y,I have used tidymodels packages many times,I work in industry,Q5_6,0,Spatial machine learning ,NA
+R_6dmkWnQQPsqTx9Y,I have used tidymodels packages many times,I work in industry,Q5_10,0,Ordinal regression,NA
+R_6dmkWnQQPsqTx9Y,I have used tidymodels packages many times,I work in industry,Q5_12,0,Other,NA
+R_4I9LzDEQg6LwVpd,I have used tidymodels packages many times,I work in industry,Q5_1,10,Sparse tibbles,NA
+R_4I9LzDEQg6LwVpd,I have used tidymodels packages many times,I work in industry,Q5_2,60,Causal inference,NA
+R_4I9LzDEQg6LwVpd,I have used tidymodels packages many times,I work in industry,Q5_3,10,Improve chattr,NA
+R_4I9LzDEQg6LwVpd,I have used tidymodels packages many times,I work in industry,Q5_4,0,Cost-sensitive learning,NA
+R_4I9LzDEQg6LwVpd,I have used tidymodels packages many times,I work in industry,Q5_5,20,Stacking ensembles,NA
+R_4I9LzDEQg6LwVpd,I have used tidymodels packages many times,I work in industry,Q5_6,0,Spatial machine learning ,NA
+R_4I9LzDEQg6LwVpd,I have used tidymodels packages many times,I work in industry,Q5_10,0,Ordinal regression,NA
+R_4I9LzDEQg6LwVpd,I have used tidymodels packages many times,I work in industry,Q5_12,0,Other,NA
+R_5Xb6bRLcdTCtp7M,I have used tidymodels packages a few times,I work in industry,Q5_1,0,Sparse tibbles,NA
+R_5Xb6bRLcdTCtp7M,I have used tidymodels packages a few times,I work in industry,Q5_2,70,Causal inference,NA
+R_5Xb6bRLcdTCtp7M,I have used tidymodels packages a few times,I work in industry,Q5_3,10,Improve chattr,NA
+R_5Xb6bRLcdTCtp7M,I have used tidymodels packages a few times,I work in industry,Q5_4,20,Cost-sensitive learning,NA
+R_5Xb6bRLcdTCtp7M,I have used tidymodels packages a few times,I work in industry,Q5_5,0,Stacking ensembles,NA
+R_5Xb6bRLcdTCtp7M,I have used tidymodels packages a few times,I work in industry,Q5_6,0,Spatial machine learning ,NA
+R_5Xb6bRLcdTCtp7M,I have used tidymodels packages a few times,I work in industry,Q5_10,0,Ordinal regression,NA
+R_5Xb6bRLcdTCtp7M,I have used tidymodels packages a few times,I work in industry,Q5_12,0,Other,NA
+R_2sbcIAJxHSY7BAJ,I have used tidymodels packages many times,I work in industry,Q5_1,30,Sparse tibbles,NA
+R_2sbcIAJxHSY7BAJ,I have used tidymodels packages many times,I work in industry,Q5_2,0,Causal inference,NA
+R_2sbcIAJxHSY7BAJ,I have used tidymodels packages many times,I work in industry,Q5_3,10,Improve chattr,NA
+R_2sbcIAJxHSY7BAJ,I have used tidymodels packages many times,I work in industry,Q5_4,30,Cost-sensitive learning,NA
+R_2sbcIAJxHSY7BAJ,I have used tidymodels packages many times,I work in industry,Q5_5,30,Stacking ensembles,NA
+R_2sbcIAJxHSY7BAJ,I have used tidymodels packages many times,I work in industry,Q5_6,0,Spatial machine learning ,NA
+R_2sbcIAJxHSY7BAJ,I have used tidymodels packages many times,I work in industry,Q5_10,0,Ordinal regression,NA
+R_2sbcIAJxHSY7BAJ,I have used tidymodels packages many times,I work in industry,Q5_12,0,Other,NA
+R_5uWzsvTpv3XNZkh,I have used tidymodels packages many times,I work in industry,Q5_1,0,Sparse tibbles,NA
+R_5uWzsvTpv3XNZkh,I have used tidymodels packages many times,I work in industry,Q5_2,20,Causal inference,NA
+R_5uWzsvTpv3XNZkh,I have used tidymodels packages many times,I work in industry,Q5_3,40,Improve chattr,NA
+R_5uWzsvTpv3XNZkh,I have used tidymodels packages many times,I work in industry,Q5_4,20,Cost-sensitive learning,NA
+R_5uWzsvTpv3XNZkh,I have used tidymodels packages many times,I work in industry,Q5_5,0,Stacking ensembles,NA
+R_5uWzsvTpv3XNZkh,I have used tidymodels packages many times,I work in industry,Q5_6,0,Spatial machine learning ,NA
+R_5uWzsvTpv3XNZkh,I have used tidymodels packages many times,I work in industry,Q5_10,20,Ordinal regression,NA
+R_5uWzsvTpv3XNZkh,I have used tidymodels packages many times,I work in industry,Q5_12,0,Other,NA
+R_4eVUTC2PjmOnjq1,I have used tidymodels packages a few times,I work in industry,Q5_1,0,Sparse tibbles,NA
+R_4eVUTC2PjmOnjq1,I have used tidymodels packages a few times,I work in industry,Q5_2,80,Causal inference,NA
+R_4eVUTC2PjmOnjq1,I have used tidymodels packages a few times,I work in industry,Q5_3,0,Improve chattr,NA
+R_4eVUTC2PjmOnjq1,I have used tidymodels packages a few times,I work in industry,Q5_4,0,Cost-sensitive learning,NA
+R_4eVUTC2PjmOnjq1,I have used tidymodels packages a few times,I work in industry,Q5_5,0,Stacking ensembles,NA
+R_4eVUTC2PjmOnjq1,I have used tidymodels packages a few times,I work in industry,Q5_6,0,Spatial machine learning ,NA
+R_4eVUTC2PjmOnjq1,I have used tidymodels packages a few times,I work in industry,Q5_10,20,Ordinal regression,NA
+R_4eVUTC2PjmOnjq1,I have used tidymodels packages a few times,I work in industry,Q5_12,0,Other,NA
+R_2LaojSKjaZgC1Cp,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_1,0,Sparse tibbles,NA
+R_2LaojSKjaZgC1Cp,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_2,25,Causal inference,NA
+R_2LaojSKjaZgC1Cp,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_3,0,Improve chattr,NA
+R_2LaojSKjaZgC1Cp,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_4,0,Cost-sensitive learning,NA
+R_2LaojSKjaZgC1Cp,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_5,50,Stacking ensembles,NA
+R_2LaojSKjaZgC1Cp,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_6,0,Spatial machine learning ,NA
+R_2LaojSKjaZgC1Cp,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_10,25,Ordinal regression,NA
+R_2LaojSKjaZgC1Cp,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_12,0,Other,NA
+R_2pVWBb47CpVNH7X,I have used tidymodels packages a few times,I work in industry,Q5_1,10,Sparse tibbles,NA
+R_2pVWBb47CpVNH7X,I have used tidymodels packages a few times,I work in industry,Q5_2,40,Causal inference,NA
+R_2pVWBb47CpVNH7X,I have used tidymodels packages a few times,I work in industry,Q5_3,10,Improve chattr,NA
+R_2pVWBb47CpVNH7X,I have used tidymodels packages a few times,I work in industry,Q5_4,0,Cost-sensitive learning,NA
+R_2pVWBb47CpVNH7X,I have used tidymodels packages a few times,I work in industry,Q5_5,0,Stacking ensembles,NA
+R_2pVWBb47CpVNH7X,I have used tidymodels packages a few times,I work in industry,Q5_6,0,Spatial machine learning ,NA
+R_2pVWBb47CpVNH7X,I have used tidymodels packages a few times,I work in industry,Q5_10,40,Ordinal regression,NA
+R_2pVWBb47CpVNH7X,I have used tidymodels packages a few times,I work in industry,Q5_12,0,Other,NA
+R_5IacUSXyrBcFeHm,I have used tidymodels packages many times,I work in industry,Q5_1,30,Sparse tibbles,NA
+R_5IacUSXyrBcFeHm,I have used tidymodels packages many times,I work in industry,Q5_2,20,Causal inference,NA
+R_5IacUSXyrBcFeHm,I have used tidymodels packages many times,I work in industry,Q5_3,0,Improve chattr,NA
+R_5IacUSXyrBcFeHm,I have used tidymodels packages many times,I work in industry,Q5_4,20,Cost-sensitive learning,NA
+R_5IacUSXyrBcFeHm,I have used tidymodels packages many times,I work in industry,Q5_5,30,Stacking ensembles,NA
+R_5IacUSXyrBcFeHm,I have used tidymodels packages many times,I work in industry,Q5_6,0,Spatial machine learning ,NA
+R_5IacUSXyrBcFeHm,I have used tidymodels packages many times,I work in industry,Q5_10,0,Ordinal regression,NA
+R_5IacUSXyrBcFeHm,I have used tidymodels packages many times,I work in industry,Q5_12,0,Other,NA
+R_6g0BFrFihbr1s51,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_1,0,Sparse tibbles,NA
+R_6g0BFrFihbr1s51,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_2,0,Causal inference,NA
+R_6g0BFrFihbr1s51,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_3,0,Improve chattr,NA
+R_6g0BFrFihbr1s51,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_4,50,Cost-sensitive learning,NA
+R_6g0BFrFihbr1s51,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_5,0,Stacking ensembles,NA
+R_6g0BFrFihbr1s51,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_6,50,Spatial machine learning ,NA
+R_6g0BFrFihbr1s51,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_10,0,Ordinal regression,NA
+R_6g0BFrFihbr1s51,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_12,0,Other,NA
+R_1ptKBebigIGrthQ,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_1,10,Sparse tibbles,NA
+R_1ptKBebigIGrthQ,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_2,10,Causal inference,NA
+R_1ptKBebigIGrthQ,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_3,20,Improve chattr,NA
+R_1ptKBebigIGrthQ,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_4,30,Cost-sensitive learning,NA
+R_1ptKBebigIGrthQ,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_5,10,Stacking ensembles,NA
+R_1ptKBebigIGrthQ,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_6,10,Spatial machine learning ,NA
+R_1ptKBebigIGrthQ,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_10,10,Ordinal regression,NA
+R_1ptKBebigIGrthQ,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_12,0,Other,NA
+R_79U9m9VxwUy8MKZ,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_1,0,Sparse tibbles,NA
+R_79U9m9VxwUy8MKZ,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_2,20,Causal inference,NA
+R_79U9m9VxwUy8MKZ,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_3,0,Improve chattr,NA
+R_79U9m9VxwUy8MKZ,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_4,0,Cost-sensitive learning,NA
+R_79U9m9VxwUy8MKZ,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_5,0,Stacking ensembles,NA
+R_79U9m9VxwUy8MKZ,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_6,0,Spatial machine learning ,NA
+R_79U9m9VxwUy8MKZ,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_10,80,Ordinal regression,NA
+R_79U9m9VxwUy8MKZ,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_12,0,Other,NA
+R_81cjSwRBGmgAVAN,I have used tidymodels packages many times,I work in industry,Q5_1,0,Sparse tibbles,NA
+R_81cjSwRBGmgAVAN,I have used tidymodels packages many times,I work in industry,Q5_2,25,Causal inference,NA
+R_81cjSwRBGmgAVAN,I have used tidymodels packages many times,I work in industry,Q5_3,25,Improve chattr,NA
+R_81cjSwRBGmgAVAN,I have used tidymodels packages many times,I work in industry,Q5_4,0,Cost-sensitive learning,NA
+R_81cjSwRBGmgAVAN,I have used tidymodels packages many times,I work in industry,Q5_5,50,Stacking ensembles,NA
+R_81cjSwRBGmgAVAN,I have used tidymodels packages many times,I work in industry,Q5_6,0,Spatial machine learning ,NA
+R_81cjSwRBGmgAVAN,I have used tidymodels packages many times,I work in industry,Q5_10,0,Ordinal regression,NA
+R_81cjSwRBGmgAVAN,I have used tidymodels packages many times,I work in industry,Q5_12,0,Other,NA
+R_8J2bmwP28YNauKO,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_1,50,Sparse tibbles,NA
+R_8J2bmwP28YNauKO,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_2,0,Causal inference,NA
+R_8J2bmwP28YNauKO,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_3,50,Improve chattr,NA
+R_8J2bmwP28YNauKO,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_4,0,Cost-sensitive learning,NA
+R_8J2bmwP28YNauKO,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_5,0,Stacking ensembles,NA
+R_8J2bmwP28YNauKO,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_6,0,Spatial machine learning ,NA
+R_8J2bmwP28YNauKO,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_10,0,Ordinal regression,NA
+R_8J2bmwP28YNauKO,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_12,0,Other,NA
+R_4w7ePJOIV8F3d6O,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_1,40,Sparse tibbles,NA
+R_4w7ePJOIV8F3d6O,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_2,6,Causal inference,NA
+R_4w7ePJOIV8F3d6O,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_3,5,Improve chattr,NA
+R_4w7ePJOIV8F3d6O,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_4,4,Cost-sensitive learning,NA
+R_4w7ePJOIV8F3d6O,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_5,10,Stacking ensembles,NA
+R_4w7ePJOIV8F3d6O,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_6,30,Spatial machine learning ,NA
+R_4w7ePJOIV8F3d6O,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_10,5,Ordinal regression,NA
+R_4w7ePJOIV8F3d6O,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_12,0,Other,NA
+R_6PFiyW33UEkoXML,I have used tidymodels packages many times,I work in industry,Q5_1,25,Sparse tibbles,NA
+R_6PFiyW33UEkoXML,I have used tidymodels packages many times,I work in industry,Q5_2,25,Causal inference,NA
+R_6PFiyW33UEkoXML,I have used tidymodels packages many times,I work in industry,Q5_3,5,Improve chattr,NA
+R_6PFiyW33UEkoXML,I have used tidymodels packages many times,I work in industry,Q5_4,25,Cost-sensitive learning,NA
+R_6PFiyW33UEkoXML,I have used tidymodels packages many times,I work in industry,Q5_5,10,Stacking ensembles,NA
+R_6PFiyW33UEkoXML,I have used tidymodels packages many times,I work in industry,Q5_6,0,Spatial machine learning ,NA
+R_6PFiyW33UEkoXML,I have used tidymodels packages many times,I work in industry,Q5_10,10,Ordinal regression,NA
+R_6PFiyW33UEkoXML,I have used tidymodels packages many times,I work in industry,Q5_12,0,Other,NA
+R_5xxaYJkdQoiZsXV,I have used tidymodels packages many times,I work in industry,Q5_1,0,Sparse tibbles,NA
+R_5xxaYJkdQoiZsXV,I have used tidymodels packages many times,I work in industry,Q5_2,25,Causal inference,NA
+R_5xxaYJkdQoiZsXV,I have used tidymodels packages many times,I work in industry,Q5_3,0,Improve chattr,NA
+R_5xxaYJkdQoiZsXV,I have used tidymodels packages many times,I work in industry,Q5_4,25,Cost-sensitive learning,NA
+R_5xxaYJkdQoiZsXV,I have used tidymodels packages many times,I work in industry,Q5_5,25,Stacking ensembles,NA
+R_5xxaYJkdQoiZsXV,I have used tidymodels packages many times,I work in industry,Q5_6,0,Spatial machine learning ,NA
+R_5xxaYJkdQoiZsXV,I have used tidymodels packages many times,I work in industry,Q5_10,25,Ordinal regression,NA
+R_5xxaYJkdQoiZsXV,I have used tidymodels packages many times,I work in industry,Q5_12,0,Other,NA
+R_6QEZ1UIe8B9Zani,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_1,0,Sparse tibbles,NA
+R_6QEZ1UIe8B9Zani,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_2,55,Causal inference,NA
+R_6QEZ1UIe8B9Zani,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_3,0,Improve chattr,NA
+R_6QEZ1UIe8B9Zani,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_4,0,Cost-sensitive learning,NA
+R_6QEZ1UIe8B9Zani,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_5,30,Stacking ensembles,NA
+R_6QEZ1UIe8B9Zani,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_6,0,Spatial machine learning ,NA
+R_6QEZ1UIe8B9Zani,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_10,15,Ordinal regression,NA
+R_6QEZ1UIe8B9Zani,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_12,0,Other,NA
+R_15HGX2MnYK7I929,I have used tidymodels packages a few times,I work in industry,Q5_1,10,Sparse tibbles,NA
+R_15HGX2MnYK7I929,I have used tidymodels packages a few times,I work in industry,Q5_2,20,Causal inference,NA
+R_15HGX2MnYK7I929,I have used tidymodels packages a few times,I work in industry,Q5_3,50,Improve chattr,NA
+R_15HGX2MnYK7I929,I have used tidymodels packages a few times,I work in industry,Q5_4,0,Cost-sensitive learning,NA
+R_15HGX2MnYK7I929,I have used tidymodels packages a few times,I work in industry,Q5_5,10,Stacking ensembles,NA
+R_15HGX2MnYK7I929,I have used tidymodels packages a few times,I work in industry,Q5_6,10,Spatial machine learning ,NA
+R_15HGX2MnYK7I929,I have used tidymodels packages a few times,I work in industry,Q5_10,0,Ordinal regression,NA
+R_15HGX2MnYK7I929,I have used tidymodels packages a few times,I work in industry,Q5_12,0,Other,NA
+R_3Rm9bbaWOhvwt7Z,I have used tidymodels packages many times,I work in industry,Q5_1,10,Sparse tibbles,NA
+R_3Rm9bbaWOhvwt7Z,I have used tidymodels packages many times,I work in industry,Q5_2,50,Causal inference,NA
+R_3Rm9bbaWOhvwt7Z,I have used tidymodels packages many times,I work in industry,Q5_3,0,Improve chattr,NA
+R_3Rm9bbaWOhvwt7Z,I have used tidymodels packages many times,I work in industry,Q5_4,0,Cost-sensitive learning,NA
+R_3Rm9bbaWOhvwt7Z,I have used tidymodels packages many times,I work in industry,Q5_5,0,Stacking ensembles,NA
+R_3Rm9bbaWOhvwt7Z,I have used tidymodels packages many times,I work in industry,Q5_6,30,Spatial machine learning ,NA
+R_3Rm9bbaWOhvwt7Z,I have used tidymodels packages many times,I work in industry,Q5_10,10,Ordinal regression,NA
+R_3Rm9bbaWOhvwt7Z,I have used tidymodels packages many times,I work in industry,Q5_12,0,Other,NA
+R_7Bq9jngWYnUMfBL,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_1,0,Sparse tibbles,NA
+R_7Bq9jngWYnUMfBL,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_2,20,Causal inference,NA
+R_7Bq9jngWYnUMfBL,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_3,10,Improve chattr,NA
+R_7Bq9jngWYnUMfBL,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_4,0,Cost-sensitive learning,NA
+R_7Bq9jngWYnUMfBL,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_5,0,Stacking ensembles,NA
+R_7Bq9jngWYnUMfBL,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_6,40,Spatial machine learning ,NA
+R_7Bq9jngWYnUMfBL,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_10,30,Ordinal regression,NA
+R_7Bq9jngWYnUMfBL,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_12,0,Other,NA
+R_1g8e51DgQXHWUWd,I have used tidymodels packages many times,I work in industry,Q5_1,15,Sparse tibbles,NA
+R_1g8e51DgQXHWUWd,I have used tidymodels packages many times,I work in industry,Q5_2,15,Causal inference,NA
+R_1g8e51DgQXHWUWd,I have used tidymodels packages many times,I work in industry,Q5_3,0,Improve chattr,NA
+R_1g8e51DgQXHWUWd,I have used tidymodels packages many times,I work in industry,Q5_4,5,Cost-sensitive learning,NA
+R_1g8e51DgQXHWUWd,I have used tidymodels packages many times,I work in industry,Q5_5,20,Stacking ensembles,NA
+R_1g8e51DgQXHWUWd,I have used tidymodels packages many times,I work in industry,Q5_6,20,Spatial machine learning ,NA
+R_1g8e51DgQXHWUWd,I have used tidymodels packages many times,I work in industry,Q5_10,5,Ordinal regression,NA
+R_1g8e51DgQXHWUWd,I have used tidymodels packages many times,I work in industry,Q5_12,20,Other,Additional embedding methods for target encoding (eg. catboost encoder)
+R_5qyQl59Cm9mrzbG,I have used tidymodels packages a few times,I work in industry,Q5_1,0,Sparse tibbles,NA
+R_5qyQl59Cm9mrzbG,I have used tidymodels packages a few times,I work in industry,Q5_2,10,Causal inference,NA
+R_5qyQl59Cm9mrzbG,I have used tidymodels packages a few times,I work in industry,Q5_3,0,Improve chattr,NA
+R_5qyQl59Cm9mrzbG,I have used tidymodels packages a few times,I work in industry,Q5_4,0,Cost-sensitive learning,NA
+R_5qyQl59Cm9mrzbG,I have used tidymodels packages a few times,I work in industry,Q5_5,0,Stacking ensembles,NA
+R_5qyQl59Cm9mrzbG,I have used tidymodels packages a few times,I work in industry,Q5_6,0,Spatial machine learning ,NA
+R_5qyQl59Cm9mrzbG,I have used tidymodels packages a few times,I work in industry,Q5_10,90,Ordinal regression,NA
+R_5qyQl59Cm9mrzbG,I have used tidymodels packages a few times,I work in industry,Q5_12,0,Other,NA
+R_2qDDzLhviFeAHXS,I have never used tidymodels,"I am an academic, professor, and/or researcher",Q5_1,10,Sparse tibbles,NA
+R_2qDDzLhviFeAHXS,I have never used tidymodels,"I am an academic, professor, and/or researcher",Q5_2,10,Causal inference,NA
+R_2qDDzLhviFeAHXS,I have never used tidymodels,"I am an academic, professor, and/or researcher",Q5_3,30,Improve chattr,NA
+R_2qDDzLhviFeAHXS,I have never used tidymodels,"I am an academic, professor, and/or researcher",Q5_4,0,Cost-sensitive learning,NA
+R_2qDDzLhviFeAHXS,I have never used tidymodels,"I am an academic, professor, and/or researcher",Q5_5,30,Stacking ensembles,NA
+R_2qDDzLhviFeAHXS,I have never used tidymodels,"I am an academic, professor, and/or researcher",Q5_6,20,Spatial machine learning ,NA
+R_2qDDzLhviFeAHXS,I have never used tidymodels,"I am an academic, professor, and/or researcher",Q5_10,0,Ordinal regression,NA
+R_2qDDzLhviFeAHXS,I have never used tidymodels,"I am an academic, professor, and/or researcher",Q5_12,0,Other,NA
+R_21HtqJyf7ora0L4,I have used tidymodels packages a few times,I work in industry,Q5_1,20,Sparse tibbles,NA
+R_21HtqJyf7ora0L4,I have used tidymodels packages a few times,I work in industry,Q5_2,40,Causal inference,NA
+R_21HtqJyf7ora0L4,I have used tidymodels packages a few times,I work in industry,Q5_3,0,Improve chattr,NA
+R_21HtqJyf7ora0L4,I have used tidymodels packages a few times,I work in industry,Q5_4,0,Cost-sensitive learning,NA
+R_21HtqJyf7ora0L4,I have used tidymodels packages a few times,I work in industry,Q5_5,0,Stacking ensembles,NA
+R_21HtqJyf7ora0L4,I have used tidymodels packages a few times,I work in industry,Q5_6,40,Spatial machine learning ,NA
+R_21HtqJyf7ora0L4,I have used tidymodels packages a few times,I work in industry,Q5_10,0,Ordinal regression,NA
+R_21HtqJyf7ora0L4,I have used tidymodels packages a few times,I work in industry,Q5_12,0,Other,NA
+R_4HtRIixzGWvUQua,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_1,20,Sparse tibbles,NA
+R_4HtRIixzGWvUQua,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_2,20,Causal inference,NA
+R_4HtRIixzGWvUQua,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_3,20,Improve chattr,NA
+R_4HtRIixzGWvUQua,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_4,0,Cost-sensitive learning,NA
+R_4HtRIixzGWvUQua,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_5,0,Stacking ensembles,NA
+R_4HtRIixzGWvUQua,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_6,10,Spatial machine learning ,NA
+R_4HtRIixzGWvUQua,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_10,30,Ordinal regression,NA
+R_4HtRIixzGWvUQua,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_12,0,Other,NA
+R_6oFwbiGp9Ycbpip,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_1,10,Sparse tibbles,NA
+R_6oFwbiGp9Ycbpip,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_2,40,Causal inference,NA
+R_6oFwbiGp9Ycbpip,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_3,0,Improve chattr,NA
+R_6oFwbiGp9Ycbpip,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_4,0,Cost-sensitive learning,NA
+R_6oFwbiGp9Ycbpip,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_5,0,Stacking ensembles,NA
+R_6oFwbiGp9Ycbpip,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_6,50,Spatial machine learning ,NA
+R_6oFwbiGp9Ycbpip,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_10,0,Ordinal regression,NA
+R_6oFwbiGp9Ycbpip,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_12,0,Other,NA
+R_2KVohS8PbKbCMtm,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_1,0,Sparse tibbles,NA
+R_2KVohS8PbKbCMtm,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_2,50,Causal inference,NA
+R_2KVohS8PbKbCMtm,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_3,0,Improve chattr,NA
+R_2KVohS8PbKbCMtm,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_4,0,Cost-sensitive learning,NA
+R_2KVohS8PbKbCMtm,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_5,0,Stacking ensembles,NA
+R_2KVohS8PbKbCMtm,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_6,0,Spatial machine learning ,NA
+R_2KVohS8PbKbCMtm,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_10,50,Ordinal regression,NA
+R_2KVohS8PbKbCMtm,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_12,0,Other,NA
+R_3eCSjmsiGP4J3Jj,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_1,0,Sparse tibbles,NA
+R_3eCSjmsiGP4J3Jj,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_2,45,Causal inference,NA
+R_3eCSjmsiGP4J3Jj,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_3,0,Improve chattr,NA
+R_3eCSjmsiGP4J3Jj,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_4,10,Cost-sensitive learning,NA
+R_3eCSjmsiGP4J3Jj,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_5,0,Stacking ensembles,NA
+R_3eCSjmsiGP4J3Jj,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_6,45,Spatial machine learning ,NA
+R_3eCSjmsiGP4J3Jj,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_10,0,Ordinal regression,NA
+R_3eCSjmsiGP4J3Jj,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_12,0,Other,NA
+R_7K8yy9dR9UgLUyu,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_1,10,Sparse tibbles,NA
+R_7K8yy9dR9UgLUyu,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_2,85,Causal inference,NA
+R_7K8yy9dR9UgLUyu,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_3,0,Improve chattr,NA
+R_7K8yy9dR9UgLUyu,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_4,0,Cost-sensitive learning,NA
+R_7K8yy9dR9UgLUyu,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_5,0,Stacking ensembles,NA
+R_7K8yy9dR9UgLUyu,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_6,0,Spatial machine learning ,NA
+R_7K8yy9dR9UgLUyu,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_10,5,Ordinal regression,NA
+R_7K8yy9dR9UgLUyu,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_12,0,Other,NA
+R_71neThd4Bhf7Wte,I have used tidymodels packages many times,I work in industry,Q5_1,0,Sparse tibbles,NA
+R_71neThd4Bhf7Wte,I have used tidymodels packages many times,I work in industry,Q5_2,20,Causal inference,NA
+R_71neThd4Bhf7Wte,I have used tidymodels packages many times,I work in industry,Q5_3,0,Improve chattr,NA
+R_71neThd4Bhf7Wte,I have used tidymodels packages many times,I work in industry,Q5_4,0,Cost-sensitive learning,NA
+R_71neThd4Bhf7Wte,I have used tidymodels packages many times,I work in industry,Q5_5,20,Stacking ensembles,NA
+R_71neThd4Bhf7Wte,I have used tidymodels packages many times,I work in industry,Q5_6,0,Spatial machine learning ,NA
+R_71neThd4Bhf7Wte,I have used tidymodels packages many times,I work in industry,Q5_10,20,Ordinal regression,NA
+R_71neThd4Bhf7Wte,I have used tidymodels packages many times,I work in industry,Q5_12,40,Other,Feature selection tools
+R_1L5q0WUPXlqhtKN,I have used tidymodels packages a few times,I work in industry,Q5_1,0,Sparse tibbles,NA
+R_1L5q0WUPXlqhtKN,I have used tidymodels packages a few times,I work in industry,Q5_2,100,Causal inference,NA
+R_1L5q0WUPXlqhtKN,I have used tidymodels packages a few times,I work in industry,Q5_3,0,Improve chattr,NA
+R_1L5q0WUPXlqhtKN,I have used tidymodels packages a few times,I work in industry,Q5_4,0,Cost-sensitive learning,NA
+R_1L5q0WUPXlqhtKN,I have used tidymodels packages a few times,I work in industry,Q5_5,0,Stacking ensembles,NA
+R_1L5q0WUPXlqhtKN,I have used tidymodels packages a few times,I work in industry,Q5_6,0,Spatial machine learning ,NA
+R_1L5q0WUPXlqhtKN,I have used tidymodels packages a few times,I work in industry,Q5_10,0,Ordinal regression,NA
+R_1L5q0WUPXlqhtKN,I have used tidymodels packages a few times,I work in industry,Q5_12,0,Other,NA
+R_6fq4ctrs6Ohza0x,I have used tidymodels packages many times,I work in industry,Q5_1,10,Sparse tibbles,NA
+R_6fq4ctrs6Ohza0x,I have used tidymodels packages many times,I work in industry,Q5_2,5,Causal inference,NA
+R_6fq4ctrs6Ohza0x,I have used tidymodels packages many times,I work in industry,Q5_3,15,Improve chattr,NA
+R_6fq4ctrs6Ohza0x,I have used tidymodels packages many times,I work in industry,Q5_4,0,Cost-sensitive learning,NA
+R_6fq4ctrs6Ohza0x,I have used tidymodels packages many times,I work in industry,Q5_5,0,Stacking ensembles,NA
+R_6fq4ctrs6Ohza0x,I have used tidymodels packages many times,I work in industry,Q5_6,0,Spatial machine learning ,NA
+R_6fq4ctrs6Ohza0x,I have used tidymodels packages many times,I work in industry,Q5_10,10,Ordinal regression,NA
+R_6fq4ctrs6Ohza0x,I have used tidymodels packages many times,I work in industry,Q5_12,60,Other,spark - full support
+R_7iqj1535fMqUb6J,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_1,10,Sparse tibbles,NA
+R_7iqj1535fMqUb6J,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_2,30,Causal inference,NA
+R_7iqj1535fMqUb6J,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_3,30,Improve chattr,NA
+R_7iqj1535fMqUb6J,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_4,0,Cost-sensitive learning,NA
+R_7iqj1535fMqUb6J,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_5,0,Stacking ensembles,NA
+R_7iqj1535fMqUb6J,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_6,30,Spatial machine learning ,NA
+R_7iqj1535fMqUb6J,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_10,0,Ordinal regression,NA
+R_7iqj1535fMqUb6J,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_12,0,Other,NA
+R_7BXFVCCex2rFc0j,I have used tidymodels packages a few times,I work in industry,Q5_1,0,Sparse tibbles,NA
+R_7BXFVCCex2rFc0j,I have used tidymodels packages a few times,I work in industry,Q5_2,0,Causal inference,NA
+R_7BXFVCCex2rFc0j,I have used tidymodels packages a few times,I work in industry,Q5_3,100,Improve chattr,NA
+R_7BXFVCCex2rFc0j,I have used tidymodels packages a few times,I work in industry,Q5_4,0,Cost-sensitive learning,NA
+R_7BXFVCCex2rFc0j,I have used tidymodels packages a few times,I work in industry,Q5_5,0,Stacking ensembles,NA
+R_7BXFVCCex2rFc0j,I have used tidymodels packages a few times,I work in industry,Q5_6,0,Spatial machine learning ,NA
+R_7BXFVCCex2rFc0j,I have used tidymodels packages a few times,I work in industry,Q5_10,0,Ordinal regression,NA
+R_7BXFVCCex2rFc0j,I have used tidymodels packages a few times,I work in industry,Q5_12,0,Other,NA
+R_5zx7OzaddzlzW6i,I have used tidymodels packages many times,I am a student,Q5_1,0,Sparse tibbles,NA
+R_5zx7OzaddzlzW6i,I have used tidymodels packages many times,I am a student,Q5_2,0,Causal inference,NA
+R_5zx7OzaddzlzW6i,I have used tidymodels packages many times,I am a student,Q5_3,0,Improve chattr,NA
+R_5zx7OzaddzlzW6i,I have used tidymodels packages many times,I am a student,Q5_4,0,Cost-sensitive learning,NA
+R_5zx7OzaddzlzW6i,I have used tidymodels packages many times,I am a student,Q5_5,50,Stacking ensembles,NA
+R_5zx7OzaddzlzW6i,I have used tidymodels packages many times,I am a student,Q5_6,50,Spatial machine learning ,NA
+R_5zx7OzaddzlzW6i,I have used tidymodels packages many times,I am a student,Q5_10,0,Ordinal regression,NA
+R_5zx7OzaddzlzW6i,I have used tidymodels packages many times,I am a student,Q5_12,0,Other,NA
+R_4CQ07cSABADzVqV,I have used tidymodels packages many times,I work in industry,Q5_1,0,Sparse tibbles,NA
+R_4CQ07cSABADzVqV,I have used tidymodels packages many times,I work in industry,Q5_2,0,Causal inference,NA
+R_4CQ07cSABADzVqV,I have used tidymodels packages many times,I work in industry,Q5_3,0,Improve chattr,NA
+R_4CQ07cSABADzVqV,I have used tidymodels packages many times,I work in industry,Q5_4,20,Cost-sensitive learning,NA
+R_4CQ07cSABADzVqV,I have used tidymodels packages many times,I work in industry,Q5_5,60,Stacking ensembles,NA
+R_4CQ07cSABADzVqV,I have used tidymodels packages many times,I work in industry,Q5_6,0,Spatial machine learning ,NA
+R_4CQ07cSABADzVqV,I have used tidymodels packages many times,I work in industry,Q5_10,20,Ordinal regression,NA
+R_4CQ07cSABADzVqV,I have used tidymodels packages many times,I work in industry,Q5_12,0,Other,NA
+R_2NUQftlAmMZJtes,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_1,0,Sparse tibbles,NA
+R_2NUQftlAmMZJtes,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_2,0,Causal inference,NA
+R_2NUQftlAmMZJtes,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_3,20,Improve chattr,NA
+R_2NUQftlAmMZJtes,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_4,80,Cost-sensitive learning,NA
+R_2NUQftlAmMZJtes,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_5,0,Stacking ensembles,NA
+R_2NUQftlAmMZJtes,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_6,0,Spatial machine learning ,NA
+R_2NUQftlAmMZJtes,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_10,0,Ordinal regression,NA
+R_2NUQftlAmMZJtes,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_12,0,Other,NA
+R_2oENq1w7qZHYrvh,I have used tidymodels packages many times,I work in industry,Q5_1,20,Sparse tibbles,NA
+R_2oENq1w7qZHYrvh,I have used tidymodels packages many times,I work in industry,Q5_2,20,Causal inference,NA
+R_2oENq1w7qZHYrvh,I have used tidymodels packages many times,I work in industry,Q5_3,0,Improve chattr,NA
+R_2oENq1w7qZHYrvh,I have used tidymodels packages many times,I work in industry,Q5_4,15,Cost-sensitive learning,NA
+R_2oENq1w7qZHYrvh,I have used tidymodels packages many times,I work in industry,Q5_5,30,Stacking ensembles,NA
+R_2oENq1w7qZHYrvh,I have used tidymodels packages many times,I work in industry,Q5_6,0,Spatial machine learning ,NA
+R_2oENq1w7qZHYrvh,I have used tidymodels packages many times,I work in industry,Q5_10,15,Ordinal regression,NA
+R_2oENq1w7qZHYrvh,I have used tidymodels packages many times,I work in industry,Q5_12,0,Other,NA
+R_7duDJ1EtiXTTRXJ,I have used tidymodels packages a few times,I am a student,Q5_1,10,Sparse tibbles,NA
+R_7duDJ1EtiXTTRXJ,I have used tidymodels packages a few times,I am a student,Q5_2,40,Causal inference,NA
+R_7duDJ1EtiXTTRXJ,I have used tidymodels packages a few times,I am a student,Q5_3,5,Improve chattr,NA
+R_7duDJ1EtiXTTRXJ,I have used tidymodels packages a few times,I am a student,Q5_4,15,Cost-sensitive learning,NA
+R_7duDJ1EtiXTTRXJ,I have used tidymodels packages a few times,I am a student,Q5_5,5,Stacking ensembles,NA
+R_7duDJ1EtiXTTRXJ,I have used tidymodels packages a few times,I am a student,Q5_6,15,Spatial machine learning ,NA
+R_7duDJ1EtiXTTRXJ,I have used tidymodels packages a few times,I am a student,Q5_10,10,Ordinal regression,NA
+R_7duDJ1EtiXTTRXJ,I have used tidymodels packages a few times,I am a student,Q5_12,0,Other,NA
+R_6F4CXCe402wSoXy,I have used tidymodels packages many times,I work in industry,Q5_1,0,Sparse tibbles,NA
+R_6F4CXCe402wSoXy,I have used tidymodels packages many times,I work in industry,Q5_2,0,Causal inference,NA
+R_6F4CXCe402wSoXy,I have used tidymodels packages many times,I work in industry,Q5_3,0,Improve chattr,NA
+R_6F4CXCe402wSoXy,I have used tidymodels packages many times,I work in industry,Q5_4,25,Cost-sensitive learning,NA
+R_6F4CXCe402wSoXy,I have used tidymodels packages many times,I work in industry,Q5_5,25,Stacking ensembles,NA
+R_6F4CXCe402wSoXy,I have used tidymodels packages many times,I work in industry,Q5_6,0,Spatial machine learning ,NA
+R_6F4CXCe402wSoXy,I have used tidymodels packages many times,I work in industry,Q5_10,50,Ordinal regression,NA
+R_6F4CXCe402wSoXy,I have used tidymodels packages many times,I work in industry,Q5_12,0,Other,NA
+R_8FTXVCdnr88V8id,I have used tidymodels packages many times,I work in industry,Q5_1,0,Sparse tibbles,NA
+R_8FTXVCdnr88V8id,I have used tidymodels packages many times,I work in industry,Q5_2,20,Causal inference,NA
+R_8FTXVCdnr88V8id,I have used tidymodels packages many times,I work in industry,Q5_3,0,Improve chattr,NA
+R_8FTXVCdnr88V8id,I have used tidymodels packages many times,I work in industry,Q5_4,10,Cost-sensitive learning,NA
+R_8FTXVCdnr88V8id,I have used tidymodels packages many times,I work in industry,Q5_5,20,Stacking ensembles,NA
+R_8FTXVCdnr88V8id,I have used tidymodels packages many times,I work in industry,Q5_6,0,Spatial machine learning ,NA
+R_8FTXVCdnr88V8id,I have used tidymodels packages many times,I work in industry,Q5_10,30,Ordinal regression,NA
+R_8FTXVCdnr88V8id,I have used tidymodels packages many times,I work in industry,Q5_12,20,Other,LETOR
+R_3mk2875xv3w0rqr,I have used tidymodels packages many times,I work in industry,Q5_1,0,Sparse tibbles,NA
+R_3mk2875xv3w0rqr,I have used tidymodels packages many times,I work in industry,Q5_2,50,Causal inference,NA
+R_3mk2875xv3w0rqr,I have used tidymodels packages many times,I work in industry,Q5_3,0,Improve chattr,NA
+R_3mk2875xv3w0rqr,I have used tidymodels packages many times,I work in industry,Q5_4,0,Cost-sensitive learning,NA
+R_3mk2875xv3w0rqr,I have used tidymodels packages many times,I work in industry,Q5_5,30,Stacking ensembles,NA
+R_3mk2875xv3w0rqr,I have used tidymodels packages many times,I work in industry,Q5_6,0,Spatial machine learning ,NA
+R_3mk2875xv3w0rqr,I have used tidymodels packages many times,I work in industry,Q5_10,20,Ordinal regression,NA
+R_3mk2875xv3w0rqr,I have used tidymodels packages many times,I work in industry,Q5_12,0,Other,NA
+R_2s9sz7mDCKJUlk5,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_1,40,Sparse tibbles,NA
+R_2s9sz7mDCKJUlk5,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_2,0,Causal inference,NA
+R_2s9sz7mDCKJUlk5,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_3,40,Improve chattr,NA
+R_2s9sz7mDCKJUlk5,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_4,0,Cost-sensitive learning,NA
+R_2s9sz7mDCKJUlk5,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_5,20,Stacking ensembles,NA
+R_2s9sz7mDCKJUlk5,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_6,0,Spatial machine learning ,NA
+R_2s9sz7mDCKJUlk5,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_10,0,Ordinal regression,NA
+R_2s9sz7mDCKJUlk5,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_12,0,Other,NA
+R_5EBuGhv4Fqx4ck5,I have used tidymodels packages a few times,I work in industry,Q5_1,0,Sparse tibbles,NA
+R_5EBuGhv4Fqx4ck5,I have used tidymodels packages a few times,I work in industry,Q5_2,70,Causal inference,NA
+R_5EBuGhv4Fqx4ck5,I have used tidymodels packages a few times,I work in industry,Q5_3,0,Improve chattr,NA
+R_5EBuGhv4Fqx4ck5,I have used tidymodels packages a few times,I work in industry,Q5_4,0,Cost-sensitive learning,NA
+R_5EBuGhv4Fqx4ck5,I have used tidymodels packages a few times,I work in industry,Q5_5,20,Stacking ensembles,NA
+R_5EBuGhv4Fqx4ck5,I have used tidymodels packages a few times,I work in industry,Q5_6,10,Spatial machine learning ,NA
+R_5EBuGhv4Fqx4ck5,I have used tidymodels packages a few times,I work in industry,Q5_10,0,Ordinal regression,NA
+R_5EBuGhv4Fqx4ck5,I have used tidymodels packages a few times,I work in industry,Q5_12,0,Other,NA
+R_1IKjAqxIx7iQV7Z,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_1,0,Sparse tibbles,NA
+R_1IKjAqxIx7iQV7Z,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_2,50,Causal inference,NA
+R_1IKjAqxIx7iQV7Z,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_3,0,Improve chattr,NA
+R_1IKjAqxIx7iQV7Z,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_4,0,Cost-sensitive learning,NA
+R_1IKjAqxIx7iQV7Z,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_5,0,Stacking ensembles,NA
+R_1IKjAqxIx7iQV7Z,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_6,25,Spatial machine learning ,NA
+R_1IKjAqxIx7iQV7Z,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_10,25,Ordinal regression,NA
+R_1IKjAqxIx7iQV7Z,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_12,0,Other,NA
+R_7R4pEQvQUHjVspB,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_1,5,Sparse tibbles,NA
+R_7R4pEQvQUHjVspB,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_2,50,Causal inference,NA
+R_7R4pEQvQUHjVspB,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_3,0,Improve chattr,NA
+R_7R4pEQvQUHjVspB,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_4,0,Cost-sensitive learning,NA
+R_7R4pEQvQUHjVspB,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_5,0,Stacking ensembles,NA
+R_7R4pEQvQUHjVspB,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_6,5,Spatial machine learning ,NA
+R_7R4pEQvQUHjVspB,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_10,10,Ordinal regression,NA
+R_7R4pEQvQUHjVspB,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_12,30,Other,time series
+R_7Gpun9Vcd1nHZc2,I have used tidymodels packages many times,I work in industry,Q5_1,0,Sparse tibbles,NA
+R_7Gpun9Vcd1nHZc2,I have used tidymodels packages many times,I work in industry,Q5_2,20,Causal inference,NA
+R_7Gpun9Vcd1nHZc2,I have used tidymodels packages many times,I work in industry,Q5_3,5,Improve chattr,NA
+R_7Gpun9Vcd1nHZc2,I have used tidymodels packages many times,I work in industry,Q5_4,60,Cost-sensitive learning,NA
+R_7Gpun9Vcd1nHZc2,I have used tidymodels packages many times,I work in industry,Q5_5,5,Stacking ensembles,NA
+R_7Gpun9Vcd1nHZc2,I have used tidymodels packages many times,I work in industry,Q5_6,0,Spatial machine learning ,NA
+R_7Gpun9Vcd1nHZc2,I have used tidymodels packages many times,I work in industry,Q5_10,10,Ordinal regression,NA
+R_7Gpun9Vcd1nHZc2,I have used tidymodels packages many times,I work in industry,Q5_12,0,Other,NA
+R_2jC908UhdNOBHWN,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_1,0,Sparse tibbles,NA
+R_2jC908UhdNOBHWN,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_2,70,Causal inference,NA
+R_2jC908UhdNOBHWN,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_3,0,Improve chattr,NA
+R_2jC908UhdNOBHWN,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_4,0,Cost-sensitive learning,NA
+R_2jC908UhdNOBHWN,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_5,30,Stacking ensembles,NA
+R_2jC908UhdNOBHWN,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_6,0,Spatial machine learning ,NA
+R_2jC908UhdNOBHWN,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_10,0,Ordinal regression,NA
+R_2jC908UhdNOBHWN,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_12,0,Other,NA
+R_50tWW9jdqwdkzGl,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_1,0,Sparse tibbles,NA
+R_50tWW9jdqwdkzGl,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_2,90,Causal inference,NA
+R_50tWW9jdqwdkzGl,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_3,0,Improve chattr,NA
+R_50tWW9jdqwdkzGl,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_4,0,Cost-sensitive learning,NA
+R_50tWW9jdqwdkzGl,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_5,10,Stacking ensembles,NA
+R_50tWW9jdqwdkzGl,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_6,0,Spatial machine learning ,NA
+R_50tWW9jdqwdkzGl,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_10,0,Ordinal regression,NA
+R_50tWW9jdqwdkzGl,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_12,0,Other,NA
+R_1EhGRoi1CvjgNyF,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_1,10,Sparse tibbles,NA
+R_1EhGRoi1CvjgNyF,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_2,5,Causal inference,NA
+R_1EhGRoi1CvjgNyF,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_3,35,Improve chattr,NA
+R_1EhGRoi1CvjgNyF,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_4,10,Cost-sensitive learning,NA
+R_1EhGRoi1CvjgNyF,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_5,20,Stacking ensembles,NA
+R_1EhGRoi1CvjgNyF,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_6,0,Spatial machine learning ,NA
+R_1EhGRoi1CvjgNyF,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_10,0,Ordinal regression,NA
+R_1EhGRoi1CvjgNyF,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_12,20,Other,"1. Parallel processing. The current tidymodel parallel scheme seems only parallelize the resample splits. It needs to expand the parallelism into the splits, especially when tunning for multiple hyperparamters."
+R_6qTBPtmfZxi5PcN,I have used tidymodels packages a few times,I work in industry,Q5_1,20,Sparse tibbles,NA
+R_6qTBPtmfZxi5PcN,I have used tidymodels packages a few times,I work in industry,Q5_2,40,Causal inference,NA
+R_6qTBPtmfZxi5PcN,I have used tidymodels packages a few times,I work in industry,Q5_3,0,Improve chattr,NA
+R_6qTBPtmfZxi5PcN,I have used tidymodels packages a few times,I work in industry,Q5_4,20,Cost-sensitive learning,NA
+R_6qTBPtmfZxi5PcN,I have used tidymodels packages a few times,I work in industry,Q5_5,0,Stacking ensembles,NA
+R_6qTBPtmfZxi5PcN,I have used tidymodels packages a few times,I work in industry,Q5_6,0,Spatial machine learning ,NA
+R_6qTBPtmfZxi5PcN,I have used tidymodels packages a few times,I work in industry,Q5_10,20,Ordinal regression,NA
+R_6qTBPtmfZxi5PcN,I have used tidymodels packages a few times,I work in industry,Q5_12,0,Other,NA
+R_1F41uSrZ2aPONFO,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_1,5,Sparse tibbles,NA
+R_1F41uSrZ2aPONFO,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_2,30,Causal inference,NA
+R_1F41uSrZ2aPONFO,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_3,5,Improve chattr,NA
+R_1F41uSrZ2aPONFO,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_4,15,Cost-sensitive learning,NA
+R_1F41uSrZ2aPONFO,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_5,10,Stacking ensembles,NA
+R_1F41uSrZ2aPONFO,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_6,5,Spatial machine learning ,NA
+R_1F41uSrZ2aPONFO,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_10,30,Ordinal regression,NA
+R_1F41uSrZ2aPONFO,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_12,0,Other,NA
+R_1qdPqRSZ43qnWlk,I have never used tidymodels,"I am an academic, professor, and/or researcher",Q5_1,10,Sparse tibbles,NA
+R_1qdPqRSZ43qnWlk,I have never used tidymodels,"I am an academic, professor, and/or researcher",Q5_2,20,Causal inference,NA
+R_1qdPqRSZ43qnWlk,I have never used tidymodels,"I am an academic, professor, and/or researcher",Q5_3,50,Improve chattr,NA
+R_1qdPqRSZ43qnWlk,I have never used tidymodels,"I am an academic, professor, and/or researcher",Q5_4,10,Cost-sensitive learning,NA
+R_1qdPqRSZ43qnWlk,I have never used tidymodels,"I am an academic, professor, and/or researcher",Q5_5,0,Stacking ensembles,NA
+R_1qdPqRSZ43qnWlk,I have never used tidymodels,"I am an academic, professor, and/or researcher",Q5_6,0,Spatial machine learning ,NA
+R_1qdPqRSZ43qnWlk,I have never used tidymodels,"I am an academic, professor, and/or researcher",Q5_10,10,Ordinal regression,NA
+R_1qdPqRSZ43qnWlk,I have never used tidymodels,"I am an academic, professor, and/or researcher",Q5_12,0,Other,NA
+R_3tKbKyIS7lEbBgk,I have contributed to tidymodels packages or taught others how to use them,"I am an academic, professor, and/or researcher",Q5_1,0,Sparse tibbles,NA
+R_3tKbKyIS7lEbBgk,I have contributed to tidymodels packages or taught others how to use them,"I am an academic, professor, and/or researcher",Q5_2,0,Causal inference,NA
+R_3tKbKyIS7lEbBgk,I have contributed to tidymodels packages or taught others how to use them,"I am an academic, professor, and/or researcher",Q5_3,0,Improve chattr,NA
+R_3tKbKyIS7lEbBgk,I have contributed to tidymodels packages or taught others how to use them,"I am an academic, professor, and/or researcher",Q5_4,50,Cost-sensitive learning,NA
+R_3tKbKyIS7lEbBgk,I have contributed to tidymodels packages or taught others how to use them,"I am an academic, professor, and/or researcher",Q5_5,0,Stacking ensembles,NA
+R_3tKbKyIS7lEbBgk,I have contributed to tidymodels packages or taught others how to use them,"I am an academic, professor, and/or researcher",Q5_6,30,Spatial machine learning ,NA
+R_3tKbKyIS7lEbBgk,I have contributed to tidymodels packages or taught others how to use them,"I am an academic, professor, and/or researcher",Q5_10,20,Ordinal regression,NA
+R_3tKbKyIS7lEbBgk,I have contributed to tidymodels packages or taught others how to use them,"I am an academic, professor, and/or researcher",Q5_12,0,Other,NA
+R_4STbdIyyYEHejVD,I have used tidymodels packages many times,I am a hobbyist,Q5_1,0,Sparse tibbles,NA
+R_4STbdIyyYEHejVD,I have used tidymodels packages many times,I am a hobbyist,Q5_2,0,Causal inference,NA
+R_4STbdIyyYEHejVD,I have used tidymodels packages many times,I am a hobbyist,Q5_3,0,Improve chattr,NA
+R_4STbdIyyYEHejVD,I have used tidymodels packages many times,I am a hobbyist,Q5_4,0,Cost-sensitive learning,NA
+R_4STbdIyyYEHejVD,I have used tidymodels packages many times,I am a hobbyist,Q5_5,0,Stacking ensembles,NA
+R_4STbdIyyYEHejVD,I have used tidymodels packages many times,I am a hobbyist,Q5_6,0,Spatial machine learning ,NA
+R_4STbdIyyYEHejVD,I have used tidymodels packages many times,I am a hobbyist,Q5_10,0,Ordinal regression,NA
+R_4STbdIyyYEHejVD,I have used tidymodels packages many times,I am a hobbyist,Q5_12,100,Other,Modeling Time Series
+R_6sZLKiFCrGG9OI4,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_1,50,Sparse tibbles,NA
+R_6sZLKiFCrGG9OI4,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_2,40,Causal inference,NA
+R_6sZLKiFCrGG9OI4,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_3,0,Improve chattr,NA
+R_6sZLKiFCrGG9OI4,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_4,10,Cost-sensitive learning,NA
+R_6sZLKiFCrGG9OI4,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_5,0,Stacking ensembles,NA
+R_6sZLKiFCrGG9OI4,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_6,0,Spatial machine learning ,NA
+R_6sZLKiFCrGG9OI4,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_10,0,Ordinal regression,NA
+R_6sZLKiFCrGG9OI4,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_12,0,Other,NA
+R_5nwSoAi2EoqBM6s,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_1,0,Sparse tibbles,NA
+R_5nwSoAi2EoqBM6s,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_2,50,Causal inference,NA
+R_5nwSoAi2EoqBM6s,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_3,0,Improve chattr,NA
+R_5nwSoAi2EoqBM6s,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_4,0,Cost-sensitive learning,NA
+R_5nwSoAi2EoqBM6s,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_5,25,Stacking ensembles,NA
+R_5nwSoAi2EoqBM6s,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_6,25,Spatial machine learning ,NA
+R_5nwSoAi2EoqBM6s,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_10,0,Ordinal regression,NA
+R_5nwSoAi2EoqBM6s,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_12,0,Other,NA
+R_3095VhUczIjhFJR,I have used tidymodels packages many times,I work in industry,Q5_1,0,Sparse tibbles,NA
+R_3095VhUczIjhFJR,I have used tidymodels packages many times,I work in industry,Q5_2,10,Causal inference,NA
+R_3095VhUczIjhFJR,I have used tidymodels packages many times,I work in industry,Q5_3,10,Improve chattr,NA
+R_3095VhUczIjhFJR,I have used tidymodels packages many times,I work in industry,Q5_4,0,Cost-sensitive learning,NA
+R_3095VhUczIjhFJR,I have used tidymodels packages many times,I work in industry,Q5_5,30,Stacking ensembles,NA
+R_3095VhUczIjhFJR,I have used tidymodels packages many times,I work in industry,Q5_6,40,Spatial machine learning ,NA
+R_3095VhUczIjhFJR,I have used tidymodels packages many times,I work in industry,Q5_10,10,Ordinal regression,NA
+R_3095VhUczIjhFJR,I have used tidymodels packages many times,I work in industry,Q5_12,0,Other,NA
+R_4CqBpwMs0eDAtlO,I have used tidymodels packages many times,I work in industry,Q5_1,10,Sparse tibbles,NA
+R_4CqBpwMs0eDAtlO,I have used tidymodels packages many times,I work in industry,Q5_2,0,Causal inference,NA
+R_4CqBpwMs0eDAtlO,I have used tidymodels packages many times,I work in industry,Q5_3,50,Improve chattr,NA
+R_4CqBpwMs0eDAtlO,I have used tidymodels packages many times,I work in industry,Q5_4,0,Cost-sensitive learning,NA
+R_4CqBpwMs0eDAtlO,I have used tidymodels packages many times,I work in industry,Q5_5,10,Stacking ensembles,NA
+R_4CqBpwMs0eDAtlO,I have used tidymodels packages many times,I work in industry,Q5_6,30,Spatial machine learning ,NA
+R_4CqBpwMs0eDAtlO,I have used tidymodels packages many times,I work in industry,Q5_10,0,Ordinal regression,NA
+R_4CqBpwMs0eDAtlO,I have used tidymodels packages many times,I work in industry,Q5_12,0,Other,NA
+R_6xCPi1iCYTu2qtf,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_1,0,Sparse tibbles,NA
+R_6xCPi1iCYTu2qtf,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_2,0,Causal inference,NA
+R_6xCPi1iCYTu2qtf,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_3,0,Improve chattr,NA
+R_6xCPi1iCYTu2qtf,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_4,0,Cost-sensitive learning,NA
+R_6xCPi1iCYTu2qtf,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_5,0,Stacking ensembles,NA
+R_6xCPi1iCYTu2qtf,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_6,0,Spatial machine learning ,NA
+R_6xCPi1iCYTu2qtf,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_10,0,Ordinal regression,NA
+R_6xCPi1iCYTu2qtf,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_12,100,Other,Add Bayesian Kernel Machine Regression models
+R_7dz5y6yYYbQM1iN,I have used tidymodels packages a few times,I work in industry,Q5_1,50,Sparse tibbles,NA
+R_7dz5y6yYYbQM1iN,I have used tidymodels packages a few times,I work in industry,Q5_2,0,Causal inference,NA
+R_7dz5y6yYYbQM1iN,I have used tidymodels packages a few times,I work in industry,Q5_3,30,Improve chattr,NA
+R_7dz5y6yYYbQM1iN,I have used tidymodels packages a few times,I work in industry,Q5_4,0,Cost-sensitive learning,NA
+R_7dz5y6yYYbQM1iN,I have used tidymodels packages a few times,I work in industry,Q5_5,0,Stacking ensembles,NA
+R_7dz5y6yYYbQM1iN,I have used tidymodels packages a few times,I work in industry,Q5_6,20,Spatial machine learning ,NA
+R_7dz5y6yYYbQM1iN,I have used tidymodels packages a few times,I work in industry,Q5_10,0,Ordinal regression,NA
+R_7dz5y6yYYbQM1iN,I have used tidymodels packages a few times,I work in industry,Q5_12,0,Other,NA
+R_64Bs6dtC6S4lbPQ,I have used tidymodels packages many times,I work in industry,Q5_1,10,Sparse tibbles,NA
+R_64Bs6dtC6S4lbPQ,I have used tidymodels packages many times,I work in industry,Q5_2,0,Causal inference,NA
+R_64Bs6dtC6S4lbPQ,I have used tidymodels packages many times,I work in industry,Q5_3,0,Improve chattr,NA
+R_64Bs6dtC6S4lbPQ,I have used tidymodels packages many times,I work in industry,Q5_4,20,Cost-sensitive learning,NA
+R_64Bs6dtC6S4lbPQ,I have used tidymodels packages many times,I work in industry,Q5_5,30,Stacking ensembles,NA
+R_64Bs6dtC6S4lbPQ,I have used tidymodels packages many times,I work in industry,Q5_6,40,Spatial machine learning ,NA
+R_64Bs6dtC6S4lbPQ,I have used tidymodels packages many times,I work in industry,Q5_10,0,Ordinal regression,NA
+R_64Bs6dtC6S4lbPQ,I have used tidymodels packages many times,I work in industry,Q5_12,0,Other,NA
+R_1ZgHZEmZYhler7z,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_1,0,Sparse tibbles,NA
+R_1ZgHZEmZYhler7z,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_2,20,Causal inference,NA
+R_1ZgHZEmZYhler7z,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_3,25,Improve chattr,NA
+R_1ZgHZEmZYhler7z,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_4,30,Cost-sensitive learning,NA
+R_1ZgHZEmZYhler7z,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_5,0,Stacking ensembles,NA
+R_1ZgHZEmZYhler7z,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_6,0,Spatial machine learning ,NA
+R_1ZgHZEmZYhler7z,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_10,25,Ordinal regression,NA
+R_1ZgHZEmZYhler7z,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_12,0,Other,NA
+R_3mZXRT4D6vIBOsV,I have used tidymodels packages many times,I work in industry,Q5_1,0,Sparse tibbles,NA
+R_3mZXRT4D6vIBOsV,I have used tidymodels packages many times,I work in industry,Q5_2,10,Causal inference,NA
+R_3mZXRT4D6vIBOsV,I have used tidymodels packages many times,I work in industry,Q5_3,0,Improve chattr,NA
+R_3mZXRT4D6vIBOsV,I have used tidymodels packages many times,I work in industry,Q5_4,0,Cost-sensitive learning,NA
+R_3mZXRT4D6vIBOsV,I have used tidymodels packages many times,I work in industry,Q5_5,0,Stacking ensembles,NA
+R_3mZXRT4D6vIBOsV,I have used tidymodels packages many times,I work in industry,Q5_6,80,Spatial machine learning ,NA
+R_3mZXRT4D6vIBOsV,I have used tidymodels packages many times,I work in industry,Q5_10,10,Ordinal regression,NA
+R_3mZXRT4D6vIBOsV,I have used tidymodels packages many times,I work in industry,Q5_12,0,Other,NA
+R_6SR2b6sKqlzXyEh,I have used tidymodels packages many times,I work in industry,Q5_1,0,Sparse tibbles,NA
+R_6SR2b6sKqlzXyEh,I have used tidymodels packages many times,I work in industry,Q5_2,20,Causal inference,NA
+R_6SR2b6sKqlzXyEh,I have used tidymodels packages many times,I work in industry,Q5_3,0,Improve chattr,NA
+R_6SR2b6sKqlzXyEh,I have used tidymodels packages many times,I work in industry,Q5_4,35,Cost-sensitive learning,NA
+R_6SR2b6sKqlzXyEh,I have used tidymodels packages many times,I work in industry,Q5_5,10,Stacking ensembles,NA
+R_6SR2b6sKqlzXyEh,I have used tidymodels packages many times,I work in industry,Q5_6,35,Spatial machine learning ,NA
+R_6SR2b6sKqlzXyEh,I have used tidymodels packages many times,I work in industry,Q5_10,0,Ordinal regression,NA
+R_6SR2b6sKqlzXyEh,I have used tidymodels packages many times,I work in industry,Q5_12,0,Other,NA
+R_3wM0sHhxtbRKbKM,I have used tidymodels packages a few times,I work in industry,Q5_1,0,Sparse tibbles,NA
+R_3wM0sHhxtbRKbKM,I have used tidymodels packages a few times,I work in industry,Q5_2,0,Causal inference,NA
+R_3wM0sHhxtbRKbKM,I have used tidymodels packages a few times,I work in industry,Q5_3,0,Improve chattr,NA
+R_3wM0sHhxtbRKbKM,I have used tidymodels packages a few times,I work in industry,Q5_4,0,Cost-sensitive learning,NA
+R_3wM0sHhxtbRKbKM,I have used tidymodels packages a few times,I work in industry,Q5_5,0,Stacking ensembles,NA
+R_3wM0sHhxtbRKbKM,I have used tidymodels packages a few times,I work in industry,Q5_6,0,Spatial machine learning ,NA
+R_3wM0sHhxtbRKbKM,I have used tidymodels packages a few times,I work in industry,Q5_10,100,Ordinal regression,NA
+R_3wM0sHhxtbRKbKM,I have used tidymodels packages a few times,I work in industry,Q5_12,0,Other,NA
+R_7nNuxvixCCBnkTA,I have used tidymodels packages many times,I work in industry,Q5_1,0,Sparse tibbles,NA
+R_7nNuxvixCCBnkTA,I have used tidymodels packages many times,I work in industry,Q5_2,75,Causal inference,NA
+R_7nNuxvixCCBnkTA,I have used tidymodels packages many times,I work in industry,Q5_3,0,Improve chattr,NA
+R_7nNuxvixCCBnkTA,I have used tidymodels packages many times,I work in industry,Q5_4,0,Cost-sensitive learning,NA
+R_7nNuxvixCCBnkTA,I have used tidymodels packages many times,I work in industry,Q5_5,20,Stacking ensembles,NA
+R_7nNuxvixCCBnkTA,I have used tidymodels packages many times,I work in industry,Q5_6,5,Spatial machine learning ,NA
+R_7nNuxvixCCBnkTA,I have used tidymodels packages many times,I work in industry,Q5_10,0,Ordinal regression,NA
+R_7nNuxvixCCBnkTA,I have used tidymodels packages many times,I work in industry,Q5_12,0,Other,NA
+R_7dnTj2cthEgYJUw,I have used tidymodels packages many times,I work in industry,Q5_1,0,Sparse tibbles,NA
+R_7dnTj2cthEgYJUw,I have used tidymodels packages many times,I work in industry,Q5_2,0,Causal inference,NA
+R_7dnTj2cthEgYJUw,I have used tidymodels packages many times,I work in industry,Q5_3,0,Improve chattr,NA
+R_7dnTj2cthEgYJUw,I have used tidymodels packages many times,I work in industry,Q5_4,0,Cost-sensitive learning,NA
+R_7dnTj2cthEgYJUw,I have used tidymodels packages many times,I work in industry,Q5_5,0,Stacking ensembles,NA
+R_7dnTj2cthEgYJUw,I have used tidymodels packages many times,I work in industry,Q5_6,100,Spatial machine learning ,NA
+R_7dnTj2cthEgYJUw,I have used tidymodels packages many times,I work in industry,Q5_10,0,Ordinal regression,NA
+R_7dnTj2cthEgYJUw,I have used tidymodels packages many times,I work in industry,Q5_12,0,Other,NA
+R_2vIc3y4vTjDhSbT,I have used tidymodels packages many times,I work in industry,Q5_1,0,Sparse tibbles,NA
+R_2vIc3y4vTjDhSbT,I have used tidymodels packages many times,I work in industry,Q5_2,30,Causal inference,NA
+R_2vIc3y4vTjDhSbT,I have used tidymodels packages many times,I work in industry,Q5_3,20,Improve chattr,NA
+R_2vIc3y4vTjDhSbT,I have used tidymodels packages many times,I work in industry,Q5_4,20,Cost-sensitive learning,NA
+R_2vIc3y4vTjDhSbT,I have used tidymodels packages many times,I work in industry,Q5_5,30,Stacking ensembles,NA
+R_2vIc3y4vTjDhSbT,I have used tidymodels packages many times,I work in industry,Q5_6,0,Spatial machine learning ,NA
+R_2vIc3y4vTjDhSbT,I have used tidymodels packages many times,I work in industry,Q5_10,0,Ordinal regression,NA
+R_2vIc3y4vTjDhSbT,I have used tidymodels packages many times,I work in industry,Q5_12,0,Other,NA
+R_7SrietJutXNQ5uf,I have used tidymodels packages many times,I work in industry,Q5_1,0,Sparse tibbles,NA
+R_7SrietJutXNQ5uf,I have used tidymodels packages many times,I work in industry,Q5_2,50,Causal inference,NA
+R_7SrietJutXNQ5uf,I have used tidymodels packages many times,I work in industry,Q5_3,0,Improve chattr,NA
+R_7SrietJutXNQ5uf,I have used tidymodels packages many times,I work in industry,Q5_4,0,Cost-sensitive learning,NA
+R_7SrietJutXNQ5uf,I have used tidymodels packages many times,I work in industry,Q5_5,20,Stacking ensembles,NA
+R_7SrietJutXNQ5uf,I have used tidymodels packages many times,I work in industry,Q5_6,0,Spatial machine learning ,NA
+R_7SrietJutXNQ5uf,I have used tidymodels packages many times,I work in industry,Q5_10,0,Ordinal regression,NA
+R_7SrietJutXNQ5uf,I have used tidymodels packages many times,I work in industry,Q5_12,30,Other,"Expand the censored package to accommodate covariates in the censoring weights, support for the stacks package, and handling of competing risks"
+R_4cYTpdjbXTUuQId,I have used tidymodels packages many times,I work in industry,Q5_1,0,Sparse tibbles,NA
+R_4cYTpdjbXTUuQId,I have used tidymodels packages many times,I work in industry,Q5_2,10,Causal inference,NA
+R_4cYTpdjbXTUuQId,I have used tidymodels packages many times,I work in industry,Q5_3,0,Improve chattr,NA
+R_4cYTpdjbXTUuQId,I have used tidymodels packages many times,I work in industry,Q5_4,5,Cost-sensitive learning,NA
+R_4cYTpdjbXTUuQId,I have used tidymodels packages many times,I work in industry,Q5_5,0,Stacking ensembles,NA
+R_4cYTpdjbXTUuQId,I have used tidymodels packages many times,I work in industry,Q5_6,75,Spatial machine learning ,NA
+R_4cYTpdjbXTUuQId,I have used tidymodels packages many times,I work in industry,Q5_10,10,Ordinal regression,NA
+R_4cYTpdjbXTUuQId,I have used tidymodels packages many times,I work in industry,Q5_12,0,Other,NA
+R_6Pze0jD5XTCPswB,I have used tidymodels packages many times,I work in industry,Q5_1,0,Sparse tibbles,NA
+R_6Pze0jD5XTCPswB,I have used tidymodels packages many times,I work in industry,Q5_2,75,Causal inference,NA
+R_6Pze0jD5XTCPswB,I have used tidymodels packages many times,I work in industry,Q5_3,0,Improve chattr,NA
+R_6Pze0jD5XTCPswB,I have used tidymodels packages many times,I work in industry,Q5_4,0,Cost-sensitive learning,NA
+R_6Pze0jD5XTCPswB,I have used tidymodels packages many times,I work in industry,Q5_5,25,Stacking ensembles,NA
+R_6Pze0jD5XTCPswB,I have used tidymodels packages many times,I work in industry,Q5_6,0,Spatial machine learning ,NA
+R_6Pze0jD5XTCPswB,I have used tidymodels packages many times,I work in industry,Q5_10,0,Ordinal regression,NA
+R_6Pze0jD5XTCPswB,I have used tidymodels packages many times,I work in industry,Q5_12,0,Other,NA
+R_5JMkNdDX6eCc6d3,I have used tidymodels packages a few times,I work in industry,Q5_1,15,Sparse tibbles,NA
+R_5JMkNdDX6eCc6d3,I have used tidymodels packages a few times,I work in industry,Q5_2,10,Causal inference,NA
+R_5JMkNdDX6eCc6d3,I have used tidymodels packages a few times,I work in industry,Q5_3,5,Improve chattr,NA
+R_5JMkNdDX6eCc6d3,I have used tidymodels packages a few times,I work in industry,Q5_4,15,Cost-sensitive learning,NA
+R_5JMkNdDX6eCc6d3,I have used tidymodels packages a few times,I work in industry,Q5_5,25,Stacking ensembles,NA
+R_5JMkNdDX6eCc6d3,I have used tidymodels packages a few times,I work in industry,Q5_6,25,Spatial machine learning ,NA
+R_5JMkNdDX6eCc6d3,I have used tidymodels packages a few times,I work in industry,Q5_10,5,Ordinal regression,NA
+R_5JMkNdDX6eCc6d3,I have used tidymodels packages a few times,I work in industry,Q5_12,0,Other,NA
+R_6m3FRtq67aUpney,I have used tidymodels packages many times,I work in industry,Q5_1,20,Sparse tibbles,NA
+R_6m3FRtq67aUpney,I have used tidymodels packages many times,I work in industry,Q5_2,40,Causal inference,NA
+R_6m3FRtq67aUpney,I have used tidymodels packages many times,I work in industry,Q5_3,0,Improve chattr,NA
+R_6m3FRtq67aUpney,I have used tidymodels packages many times,I work in industry,Q5_4,0,Cost-sensitive learning,NA
+R_6m3FRtq67aUpney,I have used tidymodels packages many times,I work in industry,Q5_5,0,Stacking ensembles,NA
+R_6m3FRtq67aUpney,I have used tidymodels packages many times,I work in industry,Q5_6,10,Spatial machine learning ,NA
+R_6m3FRtq67aUpney,I have used tidymodels packages many times,I work in industry,Q5_10,30,Ordinal regression,NA
+R_6m3FRtq67aUpney,I have used tidymodels packages many times,I work in industry,Q5_12,0,Other,NA
+R_4nq8sSSP0WX8Zod,I have used tidymodels packages many times,I work in industry,Q5_1,30,Sparse tibbles,NA
+R_4nq8sSSP0WX8Zod,I have used tidymodels packages many times,I work in industry,Q5_2,0,Causal inference,NA
+R_4nq8sSSP0WX8Zod,I have used tidymodels packages many times,I work in industry,Q5_3,0,Improve chattr,NA
+R_4nq8sSSP0WX8Zod,I have used tidymodels packages many times,I work in industry,Q5_4,15,Cost-sensitive learning,NA
+R_4nq8sSSP0WX8Zod,I have used tidymodels packages many times,I work in industry,Q5_5,0,Stacking ensembles,NA
+R_4nq8sSSP0WX8Zod,I have used tidymodels packages many times,I work in industry,Q5_6,35,Spatial machine learning ,NA
+R_4nq8sSSP0WX8Zod,I have used tidymodels packages many times,I work in industry,Q5_10,20,Ordinal regression,NA
+R_4nq8sSSP0WX8Zod,I have used tidymodels packages many times,I work in industry,Q5_12,0,Other,NA
+R_2ahFxkOnnoLLBvz,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_1,20,Sparse tibbles,NA
+R_2ahFxkOnnoLLBvz,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_2,10,Causal inference,NA
+R_2ahFxkOnnoLLBvz,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_3,15,Improve chattr,NA
+R_2ahFxkOnnoLLBvz,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_4,5,Cost-sensitive learning,NA
+R_2ahFxkOnnoLLBvz,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_5,20,Stacking ensembles,NA
+R_2ahFxkOnnoLLBvz,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_6,5,Spatial machine learning ,NA
+R_2ahFxkOnnoLLBvz,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_10,25,Ordinal regression,NA
+R_2ahFxkOnnoLLBvz,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_12,0,Other,NA
+R_5lXQprb5ymz4rZJ,I have used tidymodels packages many times,I work in industry,Q5_1,20,Sparse tibbles,NA
+R_5lXQprb5ymz4rZJ,I have used tidymodels packages many times,I work in industry,Q5_2,20,Causal inference,NA
+R_5lXQprb5ymz4rZJ,I have used tidymodels packages many times,I work in industry,Q5_3,0,Improve chattr,NA
+R_5lXQprb5ymz4rZJ,I have used tidymodels packages many times,I work in industry,Q5_4,20,Cost-sensitive learning,NA
+R_5lXQprb5ymz4rZJ,I have used tidymodels packages many times,I work in industry,Q5_5,20,Stacking ensembles,NA
+R_5lXQprb5ymz4rZJ,I have used tidymodels packages many times,I work in industry,Q5_6,20,Spatial machine learning ,NA
+R_5lXQprb5ymz4rZJ,I have used tidymodels packages many times,I work in industry,Q5_10,0,Ordinal regression,NA
+R_5lXQprb5ymz4rZJ,I have used tidymodels packages many times,I work in industry,Q5_12,0,Other,NA
+R_4oT7PhYFyehHL0s,I have used tidymodels packages many times,I work in industry,Q5_1,10,Sparse tibbles,NA
+R_4oT7PhYFyehHL0s,I have used tidymodels packages many times,I work in industry,Q5_2,10,Causal inference,NA
+R_4oT7PhYFyehHL0s,I have used tidymodels packages many times,I work in industry,Q5_3,25,Improve chattr,NA
+R_4oT7PhYFyehHL0s,I have used tidymodels packages many times,I work in industry,Q5_4,10,Cost-sensitive learning,NA
+R_4oT7PhYFyehHL0s,I have used tidymodels packages many times,I work in industry,Q5_5,25,Stacking ensembles,NA
+R_4oT7PhYFyehHL0s,I have used tidymodels packages many times,I work in industry,Q5_6,10,Spatial machine learning ,NA
+R_4oT7PhYFyehHL0s,I have used tidymodels packages many times,I work in industry,Q5_10,10,Ordinal regression,NA
+R_4oT7PhYFyehHL0s,I have used tidymodels packages many times,I work in industry,Q5_12,0,Other,NA
+R_4PIG0ijpV3meekx,I have used tidymodels packages many times,I work in industry,Q5_1,20,Sparse tibbles,NA
+R_4PIG0ijpV3meekx,I have used tidymodels packages many times,I work in industry,Q5_2,30,Causal inference,NA
+R_4PIG0ijpV3meekx,I have used tidymodels packages many times,I work in industry,Q5_3,0,Improve chattr,NA
+R_4PIG0ijpV3meekx,I have used tidymodels packages many times,I work in industry,Q5_4,10,Cost-sensitive learning,NA
+R_4PIG0ijpV3meekx,I have used tidymodels packages many times,I work in industry,Q5_5,10,Stacking ensembles,NA
+R_4PIG0ijpV3meekx,I have used tidymodels packages many times,I work in industry,Q5_6,10,Spatial machine learning ,NA
+R_4PIG0ijpV3meekx,I have used tidymodels packages many times,I work in industry,Q5_10,20,Ordinal regression,NA
+R_4PIG0ijpV3meekx,I have used tidymodels packages many times,I work in industry,Q5_12,0,Other,NA
+R_5giNCswGgXrJwyQ,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_1,0,Sparse tibbles,NA
+R_5giNCswGgXrJwyQ,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_2,50,Causal inference,NA
+R_5giNCswGgXrJwyQ,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_3,0,Improve chattr,NA
+R_5giNCswGgXrJwyQ,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_4,0,Cost-sensitive learning,NA
+R_5giNCswGgXrJwyQ,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_5,15,Stacking ensembles,NA
+R_5giNCswGgXrJwyQ,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_6,25,Spatial machine learning ,NA
+R_5giNCswGgXrJwyQ,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_10,10,Ordinal regression,NA
+R_5giNCswGgXrJwyQ,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_12,0,Other,NA
+R_1mkhctndqN6SGhH,I have never used tidymodels,"I am an academic, professor, and/or researcher",Q5_1,0,Sparse tibbles,NA
+R_1mkhctndqN6SGhH,I have never used tidymodels,"I am an academic, professor, and/or researcher",Q5_2,0,Causal inference,NA
+R_1mkhctndqN6SGhH,I have never used tidymodels,"I am an academic, professor, and/or researcher",Q5_3,0,Improve chattr,NA
+R_1mkhctndqN6SGhH,I have never used tidymodels,"I am an academic, professor, and/or researcher",Q5_4,0,Cost-sensitive learning,NA
+R_1mkhctndqN6SGhH,I have never used tidymodels,"I am an academic, professor, and/or researcher",Q5_5,50,Stacking ensembles,NA
+R_1mkhctndqN6SGhH,I have never used tidymodels,"I am an academic, professor, and/or researcher",Q5_6,50,Spatial machine learning ,NA
+R_1mkhctndqN6SGhH,I have never used tidymodels,"I am an academic, professor, and/or researcher",Q5_10,0,Ordinal regression,NA
+R_1mkhctndqN6SGhH,I have never used tidymodels,"I am an academic, professor, and/or researcher",Q5_12,0,Other,NA
+R_4VeBp8zclRByh86,I have used tidymodels packages a few times,I work in industry,Q5_1,0,Sparse tibbles,NA
+R_4VeBp8zclRByh86,I have used tidymodels packages a few times,I work in industry,Q5_2,20,Causal inference,NA
+R_4VeBp8zclRByh86,I have used tidymodels packages a few times,I work in industry,Q5_3,0,Improve chattr,NA
+R_4VeBp8zclRByh86,I have used tidymodels packages a few times,I work in industry,Q5_4,20,Cost-sensitive learning,NA
+R_4VeBp8zclRByh86,I have used tidymodels packages a few times,I work in industry,Q5_5,40,Stacking ensembles,NA
+R_4VeBp8zclRByh86,I have used tidymodels packages a few times,I work in industry,Q5_6,0,Spatial machine learning ,NA
+R_4VeBp8zclRByh86,I have used tidymodels packages a few times,I work in industry,Q5_10,20,Ordinal regression,NA
+R_4VeBp8zclRByh86,I have used tidymodels packages a few times,I work in industry,Q5_12,0,Other,NA
+R_6IowdFvCZSUWwTo,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_1,0,Sparse tibbles,NA
+R_6IowdFvCZSUWwTo,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_2,60,Causal inference,NA
+R_6IowdFvCZSUWwTo,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_3,0,Improve chattr,NA
+R_6IowdFvCZSUWwTo,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_4,0,Cost-sensitive learning,NA
+R_6IowdFvCZSUWwTo,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_5,0,Stacking ensembles,NA
+R_6IowdFvCZSUWwTo,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_6,0,Spatial machine learning ,NA
+R_6IowdFvCZSUWwTo,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_10,40,Ordinal regression,NA
+R_6IowdFvCZSUWwTo,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_12,0,Other,NA
+R_5igKeZPcEW0tdut,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_1,0,Sparse tibbles,NA
+R_5igKeZPcEW0tdut,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_2,25,Causal inference,NA
+R_5igKeZPcEW0tdut,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_3,0,Improve chattr,NA
+R_5igKeZPcEW0tdut,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_4,30,Cost-sensitive learning,NA
+R_5igKeZPcEW0tdut,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_5,15,Stacking ensembles,NA
+R_5igKeZPcEW0tdut,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_6,15,Spatial machine learning ,NA
+R_5igKeZPcEW0tdut,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_10,15,Ordinal regression,NA
+R_5igKeZPcEW0tdut,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_12,0,Other,NA
+R_2RCPpqMUkE4Me6l,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_1,0,Sparse tibbles,NA
+R_2RCPpqMUkE4Me6l,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_2,20,Causal inference,NA
+R_2RCPpqMUkE4Me6l,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_3,0,Improve chattr,NA
+R_2RCPpqMUkE4Me6l,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_4,20,Cost-sensitive learning,NA
+R_2RCPpqMUkE4Me6l,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_5,20,Stacking ensembles,NA
+R_2RCPpqMUkE4Me6l,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_6,0,Spatial machine learning ,NA
+R_2RCPpqMUkE4Me6l,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_10,20,Ordinal regression,NA
+R_2RCPpqMUkE4Me6l,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_12,20,Other,hierarchical classification models
+R_5Jkns4Dja9DOxGC,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_1,0,Sparse tibbles,NA
+R_5Jkns4Dja9DOxGC,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_2,100,Causal inference,NA
+R_5Jkns4Dja9DOxGC,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_3,0,Improve chattr,NA
+R_5Jkns4Dja9DOxGC,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_4,0,Cost-sensitive learning,NA
+R_5Jkns4Dja9DOxGC,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_5,0,Stacking ensembles,NA
+R_5Jkns4Dja9DOxGC,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_6,0,Spatial machine learning ,NA
+R_5Jkns4Dja9DOxGC,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_10,0,Ordinal regression,NA
+R_5Jkns4Dja9DOxGC,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_12,0,Other,NA
+R_4yf7E4sTDp4l8Zy,I have used tidymodels packages a few times,I work in industry,Q5_1,0,Sparse tibbles,NA
+R_4yf7E4sTDp4l8Zy,I have used tidymodels packages a few times,I work in industry,Q5_2,0,Causal inference,NA
+R_4yf7E4sTDp4l8Zy,I have used tidymodels packages a few times,I work in industry,Q5_3,0,Improve chattr,NA
+R_4yf7E4sTDp4l8Zy,I have used tidymodels packages a few times,I work in industry,Q5_4,0,Cost-sensitive learning,NA
+R_4yf7E4sTDp4l8Zy,I have used tidymodels packages a few times,I work in industry,Q5_5,0,Stacking ensembles,NA
+R_4yf7E4sTDp4l8Zy,I have used tidymodels packages a few times,I work in industry,Q5_6,0,Spatial machine learning ,NA
+R_4yf7E4sTDp4l8Zy,I have used tidymodels packages a few times,I work in industry,Q5_10,0,Ordinal regression,NA
+R_4yf7E4sTDp4l8Zy,I have used tidymodels packages a few times,I work in industry,Q5_12,100,Other,Panel and time series
+R_6zx3ho4m43pCeGp,I have used tidymodels packages a few times,I am a student,Q5_1,0,Sparse tibbles,NA
+R_6zx3ho4m43pCeGp,I have used tidymodels packages a few times,I am a student,Q5_2,90,Causal inference,NA
+R_6zx3ho4m43pCeGp,I have used tidymodels packages a few times,I am a student,Q5_3,0,Improve chattr,NA
+R_6zx3ho4m43pCeGp,I have used tidymodels packages a few times,I am a student,Q5_4,0,Cost-sensitive learning,NA
+R_6zx3ho4m43pCeGp,I have used tidymodels packages a few times,I am a student,Q5_5,0,Stacking ensembles,NA
+R_6zx3ho4m43pCeGp,I have used tidymodels packages a few times,I am a student,Q5_6,0,Spatial machine learning ,NA
+R_6zx3ho4m43pCeGp,I have used tidymodels packages a few times,I am a student,Q5_10,10,Ordinal regression,NA
+R_6zx3ho4m43pCeGp,I have used tidymodels packages a few times,I am a student,Q5_12,0,Other,NA
+R_5L7K0sCEXJQaZjy,I have used tidymodels packages a few times,I am a student,Q5_1,5,Sparse tibbles,NA
+R_5L7K0sCEXJQaZjy,I have used tidymodels packages a few times,I am a student,Q5_2,80,Causal inference,NA
+R_5L7K0sCEXJQaZjy,I have used tidymodels packages a few times,I am a student,Q5_3,0,Improve chattr,NA
+R_5L7K0sCEXJQaZjy,I have used tidymodels packages a few times,I am a student,Q5_4,0,Cost-sensitive learning,NA
+R_5L7K0sCEXJQaZjy,I have used tidymodels packages a few times,I am a student,Q5_5,0,Stacking ensembles,NA
+R_5L7K0sCEXJQaZjy,I have used tidymodels packages a few times,I am a student,Q5_6,10,Spatial machine learning ,NA
+R_5L7K0sCEXJQaZjy,I have used tidymodels packages a few times,I am a student,Q5_10,5,Ordinal regression,NA
+R_5L7K0sCEXJQaZjy,I have used tidymodels packages a few times,I am a student,Q5_12,0,Other,NA
+R_1EWRf29wsTHJoxz,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_1,0,Sparse tibbles,NA
+R_1EWRf29wsTHJoxz,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_2,50,Causal inference,NA
+R_1EWRf29wsTHJoxz,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_3,20,Improve chattr,NA
+R_1EWRf29wsTHJoxz,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_4,5,Cost-sensitive learning,NA
+R_1EWRf29wsTHJoxz,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_5,0,Stacking ensembles,NA
+R_1EWRf29wsTHJoxz,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_6,25,Spatial machine learning ,NA
+R_1EWRf29wsTHJoxz,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_10,0,Ordinal regression,NA
+R_1EWRf29wsTHJoxz,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_12,0,Other,NA
+R_6YKXk7kwbVuILIH,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_1,20,Sparse tibbles,NA
+R_6YKXk7kwbVuILIH,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_2,20,Causal inference,NA
+R_6YKXk7kwbVuILIH,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_3,0,Improve chattr,NA
+R_6YKXk7kwbVuILIH,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_4,40,Cost-sensitive learning,NA
+R_6YKXk7kwbVuILIH,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_5,0,Stacking ensembles,NA
+R_6YKXk7kwbVuILIH,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_6,0,Spatial machine learning ,NA
+R_6YKXk7kwbVuILIH,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_10,20,Ordinal regression,NA
+R_6YKXk7kwbVuILIH,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_12,0,Other,NA
+R_3kuDSSY7bttWp69,I have never used tidymodels,"I am an academic, professor, and/or researcher",Q5_1,0,Sparse tibbles,NA
+R_3kuDSSY7bttWp69,I have never used tidymodels,"I am an academic, professor, and/or researcher",Q5_2,15,Causal inference,NA
+R_3kuDSSY7bttWp69,I have never used tidymodels,"I am an academic, professor, and/or researcher",Q5_3,5,Improve chattr,NA
+R_3kuDSSY7bttWp69,I have never used tidymodels,"I am an academic, professor, and/or researcher",Q5_4,0,Cost-sensitive learning,NA
+R_3kuDSSY7bttWp69,I have never used tidymodels,"I am an academic, professor, and/or researcher",Q5_5,0,Stacking ensembles,NA
+R_3kuDSSY7bttWp69,I have never used tidymodels,"I am an academic, professor, and/or researcher",Q5_6,0,Spatial machine learning ,NA
+R_3kuDSSY7bttWp69,I have never used tidymodels,"I am an academic, professor, and/or researcher",Q5_10,80,Ordinal regression,NA
+R_3kuDSSY7bttWp69,I have never used tidymodels,"I am an academic, professor, and/or researcher",Q5_12,0,Other,NA
+R_5FLhE3ffyInPTUt,I have used tidymodels packages many times,I work in industry,Q5_1,5,Sparse tibbles,NA
+R_5FLhE3ffyInPTUt,I have used tidymodels packages many times,I work in industry,Q5_2,20,Causal inference,NA
+R_5FLhE3ffyInPTUt,I have used tidymodels packages many times,I work in industry,Q5_3,10,Improve chattr,NA
+R_5FLhE3ffyInPTUt,I have used tidymodels packages many times,I work in industry,Q5_4,10,Cost-sensitive learning,NA
+R_5FLhE3ffyInPTUt,I have used tidymodels packages many times,I work in industry,Q5_5,30,Stacking ensembles,NA
+R_5FLhE3ffyInPTUt,I have used tidymodels packages many times,I work in industry,Q5_6,5,Spatial machine learning ,NA
+R_5FLhE3ffyInPTUt,I have used tidymodels packages many times,I work in industry,Q5_10,20,Ordinal regression,NA
+R_5FLhE3ffyInPTUt,I have used tidymodels packages many times,I work in industry,Q5_12,0,Other,NA
+R_7MMwRcYOcEl0Nc6,I have used tidymodels packages many times,I work in industry,Q5_1,0,Sparse tibbles,NA
+R_7MMwRcYOcEl0Nc6,I have used tidymodels packages many times,I work in industry,Q5_2,10,Causal inference,NA
+R_7MMwRcYOcEl0Nc6,I have used tidymodels packages many times,I work in industry,Q5_3,10,Improve chattr,NA
+R_7MMwRcYOcEl0Nc6,I have used tidymodels packages many times,I work in industry,Q5_4,50,Cost-sensitive learning,NA
+R_7MMwRcYOcEl0Nc6,I have used tidymodels packages many times,I work in industry,Q5_5,20,Stacking ensembles,NA
+R_7MMwRcYOcEl0Nc6,I have used tidymodels packages many times,I work in industry,Q5_6,0,Spatial machine learning ,NA
+R_7MMwRcYOcEl0Nc6,I have used tidymodels packages many times,I work in industry,Q5_10,10,Ordinal regression,NA
+R_7MMwRcYOcEl0Nc6,I have used tidymodels packages many times,I work in industry,Q5_12,0,Other,NA
+R_2fZbdm8EiZhl64t,I have used tidymodels packages many times,I work in industry,Q5_1,0,Sparse tibbles,NA
+R_2fZbdm8EiZhl64t,I have used tidymodels packages many times,I work in industry,Q5_2,15,Causal inference,NA
+R_2fZbdm8EiZhl64t,I have used tidymodels packages many times,I work in industry,Q5_3,0,Improve chattr,NA
+R_2fZbdm8EiZhl64t,I have used tidymodels packages many times,I work in industry,Q5_4,50,Cost-sensitive learning,NA
+R_2fZbdm8EiZhl64t,I have used tidymodels packages many times,I work in industry,Q5_5,10,Stacking ensembles,NA
+R_2fZbdm8EiZhl64t,I have used tidymodels packages many times,I work in industry,Q5_6,0,Spatial machine learning ,NA
+R_2fZbdm8EiZhl64t,I have used tidymodels packages many times,I work in industry,Q5_10,25,Ordinal regression,NA
+R_2fZbdm8EiZhl64t,I have used tidymodels packages many times,I work in industry,Q5_12,0,Other,NA
+R_2laeL18FhHEKmPG,I have used tidymodels packages a few times,I work in industry,Q5_1,0,Sparse tibbles,NA
+R_2laeL18FhHEKmPG,I have used tidymodels packages a few times,I work in industry,Q5_2,30,Causal inference,NA
+R_2laeL18FhHEKmPG,I have used tidymodels packages a few times,I work in industry,Q5_3,0,Improve chattr,NA
+R_2laeL18FhHEKmPG,I have used tidymodels packages a few times,I work in industry,Q5_4,20,Cost-sensitive learning,NA
+R_2laeL18FhHEKmPG,I have used tidymodels packages a few times,I work in industry,Q5_5,10,Stacking ensembles,NA
+R_2laeL18FhHEKmPG,I have used tidymodels packages a few times,I work in industry,Q5_6,30,Spatial machine learning ,NA
+R_2laeL18FhHEKmPG,I have used tidymodels packages a few times,I work in industry,Q5_10,0,Ordinal regression,NA
+R_2laeL18FhHEKmPG,I have used tidymodels packages a few times,I work in industry,Q5_12,10,Other,"Robust procedures for outlier detection like lts, m and s estimators"
+R_4jTK46Lt5QrQvc3,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_1,0,Sparse tibbles,NA
+R_4jTK46Lt5QrQvc3,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_2,75,Causal inference,NA
+R_4jTK46Lt5QrQvc3,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_3,5,Improve chattr,NA
+R_4jTK46Lt5QrQvc3,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_4,0,Cost-sensitive learning,NA
+R_4jTK46Lt5QrQvc3,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_5,10,Stacking ensembles,NA
+R_4jTK46Lt5QrQvc3,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_6,10,Spatial machine learning ,NA
+R_4jTK46Lt5QrQvc3,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_10,0,Ordinal regression,NA
+R_4jTK46Lt5QrQvc3,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_12,0,Other,NA
+R_5xDgU9cWmF9Old7,I have used tidymodels packages many times,I work in industry,Q5_1,40,Sparse tibbles,NA
+R_5xDgU9cWmF9Old7,I have used tidymodels packages many times,I work in industry,Q5_2,30,Causal inference,NA
+R_5xDgU9cWmF9Old7,I have used tidymodels packages many times,I work in industry,Q5_3,0,Improve chattr,NA
+R_5xDgU9cWmF9Old7,I have used tidymodels packages many times,I work in industry,Q5_4,0,Cost-sensitive learning,NA
+R_5xDgU9cWmF9Old7,I have used tidymodels packages many times,I work in industry,Q5_5,30,Stacking ensembles,NA
+R_5xDgU9cWmF9Old7,I have used tidymodels packages many times,I work in industry,Q5_6,0,Spatial machine learning ,NA
+R_5xDgU9cWmF9Old7,I have used tidymodels packages many times,I work in industry,Q5_10,0,Ordinal regression,NA
+R_5xDgU9cWmF9Old7,I have used tidymodels packages many times,I work in industry,Q5_12,0,Other,NA
+R_43eG8TNG7noPP5U,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_1,0,Sparse tibbles,NA
+R_43eG8TNG7noPP5U,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_2,50,Causal inference,NA
+R_43eG8TNG7noPP5U,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_3,0,Improve chattr,NA
+R_43eG8TNG7noPP5U,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_4,0,Cost-sensitive learning,NA
+R_43eG8TNG7noPP5U,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_5,0,Stacking ensembles,NA
+R_43eG8TNG7noPP5U,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_6,0,Spatial machine learning ,NA
+R_43eG8TNG7noPP5U,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_10,50,Ordinal regression,NA
+R_43eG8TNG7noPP5U,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_12,0,Other,NA
+R_4dyxH8GKFkuKecN,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_1,10,Sparse tibbles,NA
+R_4dyxH8GKFkuKecN,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_2,50,Causal inference,NA
+R_4dyxH8GKFkuKecN,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_3,0,Improve chattr,NA
+R_4dyxH8GKFkuKecN,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_4,0,Cost-sensitive learning,NA
+R_4dyxH8GKFkuKecN,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_5,0,Stacking ensembles,NA
+R_4dyxH8GKFkuKecN,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_6,20,Spatial machine learning ,NA
+R_4dyxH8GKFkuKecN,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_10,20,Ordinal regression,NA
+R_4dyxH8GKFkuKecN,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_12,0,Other,NA
+R_3ofT5UOx3HKKhZD,I have used tidymodels packages a few times,I am a student,Q5_1,10,Sparse tibbles,NA
+R_3ofT5UOx3HKKhZD,I have used tidymodels packages a few times,I am a student,Q5_2,25,Causal inference,NA
+R_3ofT5UOx3HKKhZD,I have used tidymodels packages a few times,I am a student,Q5_3,5,Improve chattr,NA
+R_3ofT5UOx3HKKhZD,I have used tidymodels packages a few times,I am a student,Q5_4,5,Cost-sensitive learning,NA
+R_3ofT5UOx3HKKhZD,I have used tidymodels packages a few times,I am a student,Q5_5,10,Stacking ensembles,NA
+R_3ofT5UOx3HKKhZD,I have used tidymodels packages a few times,I am a student,Q5_6,25,Spatial machine learning ,NA
+R_3ofT5UOx3HKKhZD,I have used tidymodels packages a few times,I am a student,Q5_10,5,Ordinal regression,NA
+R_3ofT5UOx3HKKhZD,I have used tidymodels packages a few times,I am a student,Q5_12,15,Other,Experimental desing
+R_2DbzFUtN1dMzltr,I have used tidymodels packages many times,I work in industry,Q5_1,0,Sparse tibbles,NA
+R_2DbzFUtN1dMzltr,I have used tidymodels packages many times,I work in industry,Q5_2,0,Causal inference,NA
+R_2DbzFUtN1dMzltr,I have used tidymodels packages many times,I work in industry,Q5_3,0,Improve chattr,NA
+R_2DbzFUtN1dMzltr,I have used tidymodels packages many times,I work in industry,Q5_4,0,Cost-sensitive learning,NA
+R_2DbzFUtN1dMzltr,I have used tidymodels packages many times,I work in industry,Q5_5,0,Stacking ensembles,NA
+R_2DbzFUtN1dMzltr,I have used tidymodels packages many times,I work in industry,Q5_6,100,Spatial machine learning ,NA
+R_2DbzFUtN1dMzltr,I have used tidymodels packages many times,I work in industry,Q5_10,0,Ordinal regression,NA
+R_2DbzFUtN1dMzltr,I have used tidymodels packages many times,I work in industry,Q5_12,0,Other,NA
+R_7oZwxSyfTx9f5of,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_1,0,Sparse tibbles,NA
+R_7oZwxSyfTx9f5of,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_2,50,Causal inference,NA
+R_7oZwxSyfTx9f5of,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_3,0,Improve chattr,NA
+R_7oZwxSyfTx9f5of,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_4,0,Cost-sensitive learning,NA
+R_7oZwxSyfTx9f5of,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_5,0,Stacking ensembles,NA
+R_7oZwxSyfTx9f5of,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_6,50,Spatial machine learning ,NA
+R_7oZwxSyfTx9f5of,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_10,0,Ordinal regression,NA
+R_7oZwxSyfTx9f5of,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_12,0,Other,NA
+R_1ipduiiTYZq9RyV,I have contributed to tidymodels packages or taught others how to use them,I am a student,Q5_1,0,Sparse tibbles,NA
+R_1ipduiiTYZq9RyV,I have contributed to tidymodels packages or taught others how to use them,I am a student,Q5_2,15,Causal inference,NA
+R_1ipduiiTYZq9RyV,I have contributed to tidymodels packages or taught others how to use them,I am a student,Q5_3,0,Improve chattr,NA
+R_1ipduiiTYZq9RyV,I have contributed to tidymodels packages or taught others how to use them,I am a student,Q5_4,0,Cost-sensitive learning,NA
+R_1ipduiiTYZq9RyV,I have contributed to tidymodels packages or taught others how to use them,I am a student,Q5_5,30,Stacking ensembles,NA
+R_1ipduiiTYZq9RyV,I have contributed to tidymodels packages or taught others how to use them,I am a student,Q5_6,50,Spatial machine learning ,NA
+R_1ipduiiTYZq9RyV,I have contributed to tidymodels packages or taught others how to use them,I am a student,Q5_10,5,Ordinal regression,NA
+R_1ipduiiTYZq9RyV,I have contributed to tidymodels packages or taught others how to use them,I am a student,Q5_12,0,Other,NA
+R_8YK6JSY7Otbiv1H,I have used tidymodels packages many times,I work in industry,Q5_1,0,Sparse tibbles,NA
+R_8YK6JSY7Otbiv1H,I have used tidymodels packages many times,I work in industry,Q5_2,50,Causal inference,NA
+R_8YK6JSY7Otbiv1H,I have used tidymodels packages many times,I work in industry,Q5_3,0,Improve chattr,NA
+R_8YK6JSY7Otbiv1H,I have used tidymodels packages many times,I work in industry,Q5_4,15,Cost-sensitive learning,NA
+R_8YK6JSY7Otbiv1H,I have used tidymodels packages many times,I work in industry,Q5_5,15,Stacking ensembles,NA
+R_8YK6JSY7Otbiv1H,I have used tidymodels packages many times,I work in industry,Q5_6,0,Spatial machine learning ,NA
+R_8YK6JSY7Otbiv1H,I have used tidymodels packages many times,I work in industry,Q5_10,20,Ordinal regression,NA
+R_8YK6JSY7Otbiv1H,I have used tidymodels packages many times,I work in industry,Q5_12,0,Other,NA
+R_3dmFEJgGlGSX4mT,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_1,0,Sparse tibbles,NA
+R_3dmFEJgGlGSX4mT,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_2,5,Causal inference,NA
+R_3dmFEJgGlGSX4mT,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_3,0,Improve chattr,NA
+R_3dmFEJgGlGSX4mT,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_4,10,Cost-sensitive learning,NA
+R_3dmFEJgGlGSX4mT,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_5,0,Stacking ensembles,NA
+R_3dmFEJgGlGSX4mT,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_6,10,Spatial machine learning ,NA
+R_3dmFEJgGlGSX4mT,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_10,0,Ordinal regression,NA
+R_3dmFEJgGlGSX4mT,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_12,75,Other,Passing validation data to early-stopping in models which support them. Perhaps using nested cross-validation designs.
+R_3flJXp3ko9YazwQ,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_1,20,Sparse tibbles,NA
+R_3flJXp3ko9YazwQ,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_2,30,Causal inference,NA
+R_3flJXp3ko9YazwQ,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_3,0,Improve chattr,NA
+R_3flJXp3ko9YazwQ,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_4,0,Cost-sensitive learning,NA
+R_3flJXp3ko9YazwQ,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_5,50,Stacking ensembles,NA
+R_3flJXp3ko9YazwQ,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_6,0,Spatial machine learning ,NA
+R_3flJXp3ko9YazwQ,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_10,0,Ordinal regression,NA
+R_3flJXp3ko9YazwQ,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_12,0,Other,NA
+R_1g68MqSY19BCyUF,I have used tidymodels packages many times,I work in industry,Q5_1,0,Sparse tibbles,NA
+R_1g68MqSY19BCyUF,I have used tidymodels packages many times,I work in industry,Q5_2,50,Causal inference,NA
+R_1g68MqSY19BCyUF,I have used tidymodels packages many times,I work in industry,Q5_3,0,Improve chattr,NA
+R_1g68MqSY19BCyUF,I have used tidymodels packages many times,I work in industry,Q5_4,50,Cost-sensitive learning,NA
+R_1g68MqSY19BCyUF,I have used tidymodels packages many times,I work in industry,Q5_5,0,Stacking ensembles,NA
+R_1g68MqSY19BCyUF,I have used tidymodels packages many times,I work in industry,Q5_6,0,Spatial machine learning ,NA
+R_1g68MqSY19BCyUF,I have used tidymodels packages many times,I work in industry,Q5_10,0,Ordinal regression,NA
+R_1g68MqSY19BCyUF,I have used tidymodels packages many times,I work in industry,Q5_12,0,Other,NA
+R_8aLJnXowFRHqlbo,I have used tidymodels packages a few times,I work in industry,Q5_1,80,Sparse tibbles,NA
+R_8aLJnXowFRHqlbo,I have used tidymodels packages a few times,I work in industry,Q5_2,10,Causal inference,NA
+R_8aLJnXowFRHqlbo,I have used tidymodels packages a few times,I work in industry,Q5_3,0,Improve chattr,NA
+R_8aLJnXowFRHqlbo,I have used tidymodels packages a few times,I work in industry,Q5_4,0,Cost-sensitive learning,NA
+R_8aLJnXowFRHqlbo,I have used tidymodels packages a few times,I work in industry,Q5_5,10,Stacking ensembles,NA
+R_8aLJnXowFRHqlbo,I have used tidymodels packages a few times,I work in industry,Q5_6,0,Spatial machine learning ,NA
+R_8aLJnXowFRHqlbo,I have used tidymodels packages a few times,I work in industry,Q5_10,0,Ordinal regression,NA
+R_8aLJnXowFRHqlbo,I have used tidymodels packages a few times,I work in industry,Q5_12,0,Other,NA
+R_7wTheVnj774jOyL,I have used tidymodels packages a few times,I work in industry,Q5_1,0,Sparse tibbles,NA
+R_7wTheVnj774jOyL,I have used tidymodels packages a few times,I work in industry,Q5_2,50,Causal inference,NA
+R_7wTheVnj774jOyL,I have used tidymodels packages a few times,I work in industry,Q5_3,30,Improve chattr,NA
+R_7wTheVnj774jOyL,I have used tidymodels packages a few times,I work in industry,Q5_4,0,Cost-sensitive learning,NA
+R_7wTheVnj774jOyL,I have used tidymodels packages a few times,I work in industry,Q5_5,10,Stacking ensembles,NA
+R_7wTheVnj774jOyL,I have used tidymodels packages a few times,I work in industry,Q5_6,10,Spatial machine learning ,NA
+R_7wTheVnj774jOyL,I have used tidymodels packages a few times,I work in industry,Q5_10,0,Ordinal regression,NA
+R_7wTheVnj774jOyL,I have used tidymodels packages a few times,I work in industry,Q5_12,0,Other,NA
+R_28ThKgPTJq7NYzv,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_1,0,Sparse tibbles,NA
+R_28ThKgPTJq7NYzv,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_2,0,Causal inference,NA
+R_28ThKgPTJq7NYzv,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_3,0,Improve chattr,NA
+R_28ThKgPTJq7NYzv,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_4,0,Cost-sensitive learning,NA
+R_28ThKgPTJq7NYzv,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_5,0,Stacking ensembles,NA
+R_28ThKgPTJq7NYzv,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_6,0,Spatial machine learning ,NA
+R_28ThKgPTJq7NYzv,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_10,0,Ordinal regression,NA
+R_28ThKgPTJq7NYzv,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_12,100,Other,gpu computaion (rapids like)
+R_53cIYByaHmlvKed,I have used tidymodels packages a few times,I work in industry,Q5_1,0,Sparse tibbles,NA
+R_53cIYByaHmlvKed,I have used tidymodels packages a few times,I work in industry,Q5_2,80,Causal inference,NA
+R_53cIYByaHmlvKed,I have used tidymodels packages a few times,I work in industry,Q5_3,0,Improve chattr,NA
+R_53cIYByaHmlvKed,I have used tidymodels packages a few times,I work in industry,Q5_4,0,Cost-sensitive learning,NA
+R_53cIYByaHmlvKed,I have used tidymodels packages a few times,I work in industry,Q5_5,10,Stacking ensembles,NA
+R_53cIYByaHmlvKed,I have used tidymodels packages a few times,I work in industry,Q5_6,0,Spatial machine learning ,NA
+R_53cIYByaHmlvKed,I have used tidymodels packages a few times,I work in industry,Q5_10,10,Ordinal regression,NA
+R_53cIYByaHmlvKed,I have used tidymodels packages a few times,I work in industry,Q5_12,0,Other,NA
+R_3rpIA5CRFobHthm,I have used tidymodels packages many times,I work in industry,Q5_1,50,Sparse tibbles,NA
+R_3rpIA5CRFobHthm,I have used tidymodels packages many times,I work in industry,Q5_2,50,Causal inference,NA
+R_3rpIA5CRFobHthm,I have used tidymodels packages many times,I work in industry,Q5_3,0,Improve chattr,NA
+R_3rpIA5CRFobHthm,I have used tidymodels packages many times,I work in industry,Q5_4,0,Cost-sensitive learning,NA
+R_3rpIA5CRFobHthm,I have used tidymodels packages many times,I work in industry,Q5_5,0,Stacking ensembles,NA
+R_3rpIA5CRFobHthm,I have used tidymodels packages many times,I work in industry,Q5_6,0,Spatial machine learning ,NA
+R_3rpIA5CRFobHthm,I have used tidymodels packages many times,I work in industry,Q5_10,0,Ordinal regression,NA
+R_3rpIA5CRFobHthm,I have used tidymodels packages many times,I work in industry,Q5_12,0,Other,NA
+R_4VrMcDJWPZmTJfl,I have used tidymodels packages a few times,I work in industry,Q5_1,0,Sparse tibbles,NA
+R_4VrMcDJWPZmTJfl,I have used tidymodels packages a few times,I work in industry,Q5_2,50,Causal inference,NA
+R_4VrMcDJWPZmTJfl,I have used tidymodels packages a few times,I work in industry,Q5_3,0,Improve chattr,NA
+R_4VrMcDJWPZmTJfl,I have used tidymodels packages a few times,I work in industry,Q5_4,0,Cost-sensitive learning,NA
+R_4VrMcDJWPZmTJfl,I have used tidymodels packages a few times,I work in industry,Q5_5,0,Stacking ensembles,NA
+R_4VrMcDJWPZmTJfl,I have used tidymodels packages a few times,I work in industry,Q5_6,50,Spatial machine learning ,NA
+R_4VrMcDJWPZmTJfl,I have used tidymodels packages a few times,I work in industry,Q5_10,0,Ordinal regression,NA
+R_4VrMcDJWPZmTJfl,I have used tidymodels packages a few times,I work in industry,Q5_12,0,Other,NA
+R_2QFQfpf7AEHgKaK,I have used tidymodels packages many times,I work in industry,Q5_1,10,Sparse tibbles,NA
+R_2QFQfpf7AEHgKaK,I have used tidymodels packages many times,I work in industry,Q5_2,75,Causal inference,NA
+R_2QFQfpf7AEHgKaK,I have used tidymodels packages many times,I work in industry,Q5_3,0,Improve chattr,NA
+R_2QFQfpf7AEHgKaK,I have used tidymodels packages many times,I work in industry,Q5_4,0,Cost-sensitive learning,NA
+R_2QFQfpf7AEHgKaK,I have used tidymodels packages many times,I work in industry,Q5_5,0,Stacking ensembles,NA
+R_2QFQfpf7AEHgKaK,I have used tidymodels packages many times,I work in industry,Q5_6,0,Spatial machine learning ,NA
+R_2QFQfpf7AEHgKaK,I have used tidymodels packages many times,I work in industry,Q5_10,15,Ordinal regression,NA
+R_2QFQfpf7AEHgKaK,I have used tidymodels packages many times,I work in industry,Q5_12,0,Other,NA
+R_83tq8wseMCXLaRb,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_1,0,Sparse tibbles,NA
+R_83tq8wseMCXLaRb,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_2,60,Causal inference,NA
+R_83tq8wseMCXLaRb,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_3,0,Improve chattr,NA
+R_83tq8wseMCXLaRb,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_4,15,Cost-sensitive learning,NA
+R_83tq8wseMCXLaRb,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_5,0,Stacking ensembles,NA
+R_83tq8wseMCXLaRb,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_6,15,Spatial machine learning ,NA
+R_83tq8wseMCXLaRb,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_10,10,Ordinal regression,NA
+R_83tq8wseMCXLaRb,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_12,0,Other,NA
+R_1n8VC8o2g81d4o6,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_1,10,Sparse tibbles,NA
+R_1n8VC8o2g81d4o6,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_2,10,Causal inference,NA
+R_1n8VC8o2g81d4o6,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_3,0,Improve chattr,NA
+R_1n8VC8o2g81d4o6,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_4,0,Cost-sensitive learning,NA
+R_1n8VC8o2g81d4o6,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_5,70,Stacking ensembles,NA
+R_1n8VC8o2g81d4o6,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_6,10,Spatial machine learning ,NA
+R_1n8VC8o2g81d4o6,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_10,0,Ordinal regression,NA
+R_1n8VC8o2g81d4o6,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_12,0,Other,NA
+R_3Ic6tsLoPjhHQqg,I have used tidymodels packages many times,I work in industry,Q5_1,15,Sparse tibbles,NA
+R_3Ic6tsLoPjhHQqg,I have used tidymodels packages many times,I work in industry,Q5_2,0,Causal inference,NA
+R_3Ic6tsLoPjhHQqg,I have used tidymodels packages many times,I work in industry,Q5_3,0,Improve chattr,NA
+R_3Ic6tsLoPjhHQqg,I have used tidymodels packages many times,I work in industry,Q5_4,30,Cost-sensitive learning,NA
+R_3Ic6tsLoPjhHQqg,I have used tidymodels packages many times,I work in industry,Q5_5,10,Stacking ensembles,NA
+R_3Ic6tsLoPjhHQqg,I have used tidymodels packages many times,I work in industry,Q5_6,15,Spatial machine learning ,NA
+R_3Ic6tsLoPjhHQqg,I have used tidymodels packages many times,I work in industry,Q5_10,0,Ordinal regression,NA
+R_3Ic6tsLoPjhHQqg,I have used tidymodels packages many times,I work in industry,Q5_12,30,Other,improve survival / censored
+R_5jv8j6YUS2T3u2i,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_1,0,Sparse tibbles,NA
+R_5jv8j6YUS2T3u2i,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_2,20,Causal inference,NA
+R_5jv8j6YUS2T3u2i,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_3,0,Improve chattr,NA
+R_5jv8j6YUS2T3u2i,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_4,10,Cost-sensitive learning,NA
+R_5jv8j6YUS2T3u2i,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_5,30,Stacking ensembles,NA
+R_5jv8j6YUS2T3u2i,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_6,0,Spatial machine learning ,NA
+R_5jv8j6YUS2T3u2i,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_10,40,Ordinal regression,NA
+R_5jv8j6YUS2T3u2i,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_12,0,Other,NA
+R_73ma9ltlJUK5Ukb,I have used tidymodels packages a few times,I work in industry,Q5_1,10,Sparse tibbles,NA
+R_73ma9ltlJUK5Ukb,I have used tidymodels packages a few times,I work in industry,Q5_2,15,Causal inference,NA
+R_73ma9ltlJUK5Ukb,I have used tidymodels packages a few times,I work in industry,Q5_3,25,Improve chattr,NA
+R_73ma9ltlJUK5Ukb,I have used tidymodels packages a few times,I work in industry,Q5_4,0,Cost-sensitive learning,NA
+R_73ma9ltlJUK5Ukb,I have used tidymodels packages a few times,I work in industry,Q5_5,0,Stacking ensembles,NA
+R_73ma9ltlJUK5Ukb,I have used tidymodels packages a few times,I work in industry,Q5_6,0,Spatial machine learning ,NA
+R_73ma9ltlJUK5Ukb,I have used tidymodels packages a few times,I work in industry,Q5_10,50,Ordinal regression,NA
+R_73ma9ltlJUK5Ukb,I have used tidymodels packages a few times,I work in industry,Q5_12,0,Other,NA
+R_4S2byuzvApPWPIg,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_1,0,Sparse tibbles,NA
+R_4S2byuzvApPWPIg,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_2,50,Causal inference,NA
+R_4S2byuzvApPWPIg,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_3,0,Improve chattr,NA
+R_4S2byuzvApPWPIg,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_4,50,Cost-sensitive learning,NA
+R_4S2byuzvApPWPIg,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_5,0,Stacking ensembles,NA
+R_4S2byuzvApPWPIg,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_6,0,Spatial machine learning ,NA
+R_4S2byuzvApPWPIg,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_10,0,Ordinal regression,NA
+R_4S2byuzvApPWPIg,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_12,0,Other,NA
+R_4lt91OMq9gu1sFV,I have used tidymodels packages many times,I work in industry,Q5_1,15,Sparse tibbles,NA
+R_4lt91OMq9gu1sFV,I have used tidymodels packages many times,I work in industry,Q5_2,10,Causal inference,NA
+R_4lt91OMq9gu1sFV,I have used tidymodels packages many times,I work in industry,Q5_3,20,Improve chattr,NA
+R_4lt91OMq9gu1sFV,I have used tidymodels packages many times,I work in industry,Q5_4,20,Cost-sensitive learning,NA
+R_4lt91OMq9gu1sFV,I have used tidymodels packages many times,I work in industry,Q5_5,20,Stacking ensembles,NA
+R_4lt91OMq9gu1sFV,I have used tidymodels packages many times,I work in industry,Q5_6,5,Spatial machine learning ,NA
+R_4lt91OMq9gu1sFV,I have used tidymodels packages many times,I work in industry,Q5_10,10,Ordinal regression,NA
+R_4lt91OMq9gu1sFV,I have used tidymodels packages many times,I work in industry,Q5_12,0,Other,NA
+R_7mnAe3ZWx1MkXNT,I have used tidymodels packages many times,I work in industry,Q5_1,0,Sparse tibbles,NA
+R_7mnAe3ZWx1MkXNT,I have used tidymodels packages many times,I work in industry,Q5_2,50,Causal inference,NA
+R_7mnAe3ZWx1MkXNT,I have used tidymodels packages many times,I work in industry,Q5_3,0,Improve chattr,NA
+R_7mnAe3ZWx1MkXNT,I have used tidymodels packages many times,I work in industry,Q5_4,0,Cost-sensitive learning,NA
+R_7mnAe3ZWx1MkXNT,I have used tidymodels packages many times,I work in industry,Q5_5,50,Stacking ensembles,NA
+R_7mnAe3ZWx1MkXNT,I have used tidymodels packages many times,I work in industry,Q5_6,0,Spatial machine learning ,NA
+R_7mnAe3ZWx1MkXNT,I have used tidymodels packages many times,I work in industry,Q5_10,0,Ordinal regression,NA
+R_7mnAe3ZWx1MkXNT,I have used tidymodels packages many times,I work in industry,Q5_12,0,Other,NA
+R_3J11uwwYHwPXalH,I have used tidymodels packages many times,I work in industry,Q5_1,0,Sparse tibbles,NA
+R_3J11uwwYHwPXalH,I have used tidymodels packages many times,I work in industry,Q5_2,100,Causal inference,NA
+R_3J11uwwYHwPXalH,I have used tidymodels packages many times,I work in industry,Q5_3,0,Improve chattr,NA
+R_3J11uwwYHwPXalH,I have used tidymodels packages many times,I work in industry,Q5_4,0,Cost-sensitive learning,NA
+R_3J11uwwYHwPXalH,I have used tidymodels packages many times,I work in industry,Q5_5,0,Stacking ensembles,NA
+R_3J11uwwYHwPXalH,I have used tidymodels packages many times,I work in industry,Q5_6,0,Spatial machine learning ,NA
+R_3J11uwwYHwPXalH,I have used tidymodels packages many times,I work in industry,Q5_10,0,Ordinal regression,NA
+R_3J11uwwYHwPXalH,I have used tidymodels packages many times,I work in industry,Q5_12,0,Other,NA
+R_2l9MJLz4JTOScqp,I have used tidymodels packages many times,I am a student,Q5_1,10,Sparse tibbles,NA
+R_2l9MJLz4JTOScqp,I have used tidymodels packages many times,I am a student,Q5_2,10,Causal inference,NA
+R_2l9MJLz4JTOScqp,I have used tidymodels packages many times,I am a student,Q5_3,5,Improve chattr,NA
+R_2l9MJLz4JTOScqp,I have used tidymodels packages many times,I am a student,Q5_4,40,Cost-sensitive learning,NA
+R_2l9MJLz4JTOScqp,I have used tidymodels packages many times,I am a student,Q5_5,20,Stacking ensembles,NA
+R_2l9MJLz4JTOScqp,I have used tidymodels packages many times,I am a student,Q5_6,5,Spatial machine learning ,NA
+R_2l9MJLz4JTOScqp,I have used tidymodels packages many times,I am a student,Q5_10,10,Ordinal regression,NA
+R_2l9MJLz4JTOScqp,I have used tidymodels packages many times,I am a student,Q5_12,0,Other,NA
+R_3IQdsvmiolifu65,I have used tidymodels packages a few times,I work in industry,Q5_1,0,Sparse tibbles,NA
+R_3IQdsvmiolifu65,I have used tidymodels packages a few times,I work in industry,Q5_2,50,Causal inference,NA
+R_3IQdsvmiolifu65,I have used tidymodels packages a few times,I work in industry,Q5_3,0,Improve chattr,NA
+R_3IQdsvmiolifu65,I have used tidymodels packages a few times,I work in industry,Q5_4,20,Cost-sensitive learning,NA
+R_3IQdsvmiolifu65,I have used tidymodels packages a few times,I work in industry,Q5_5,20,Stacking ensembles,NA
+R_3IQdsvmiolifu65,I have used tidymodels packages a few times,I work in industry,Q5_6,10,Spatial machine learning ,NA
+R_3IQdsvmiolifu65,I have used tidymodels packages a few times,I work in industry,Q5_10,0,Ordinal regression,NA
+R_3IQdsvmiolifu65,I have used tidymodels packages a few times,I work in industry,Q5_12,0,Other,NA
+R_51iIGIgFVUSLWPV,I have used tidymodels packages many times,I work in industry,Q5_1,5,Sparse tibbles,NA
+R_51iIGIgFVUSLWPV,I have used tidymodels packages many times,I work in industry,Q5_2,20,Causal inference,NA
+R_51iIGIgFVUSLWPV,I have used tidymodels packages many times,I work in industry,Q5_3,30,Improve chattr,NA
+R_51iIGIgFVUSLWPV,I have used tidymodels packages many times,I work in industry,Q5_4,5,Cost-sensitive learning,NA
+R_51iIGIgFVUSLWPV,I have used tidymodels packages many times,I work in industry,Q5_5,10,Stacking ensembles,NA
+R_51iIGIgFVUSLWPV,I have used tidymodels packages many times,I work in industry,Q5_6,20,Spatial machine learning ,NA
+R_51iIGIgFVUSLWPV,I have used tidymodels packages many times,I work in industry,Q5_10,10,Ordinal regression,NA
+R_51iIGIgFVUSLWPV,I have used tidymodels packages many times,I work in industry,Q5_12,0,Other,NA
+R_7puwXT8n8087IdG,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_1,20,Sparse tibbles,NA
+R_7puwXT8n8087IdG,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_2,0,Causal inference,NA
+R_7puwXT8n8087IdG,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_3,10,Improve chattr,NA
+R_7puwXT8n8087IdG,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_4,30,Cost-sensitive learning,NA
+R_7puwXT8n8087IdG,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_5,30,Stacking ensembles,NA
+R_7puwXT8n8087IdG,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_6,10,Spatial machine learning ,NA
+R_7puwXT8n8087IdG,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_10,0,Ordinal regression,NA
+R_7puwXT8n8087IdG,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_12,0,Other,NA
+R_2WpLptSq5iHRe9j,I have used tidymodels packages many times,I work in industry,Q5_1,5,Sparse tibbles,NA
+R_2WpLptSq5iHRe9j,I have used tidymodels packages many times,I work in industry,Q5_2,10,Causal inference,NA
+R_2WpLptSq5iHRe9j,I have used tidymodels packages many times,I work in industry,Q5_3,15,Improve chattr,NA
+R_2WpLptSq5iHRe9j,I have used tidymodels packages many times,I work in industry,Q5_4,20,Cost-sensitive learning,NA
+R_2WpLptSq5iHRe9j,I have used tidymodels packages many times,I work in industry,Q5_5,30,Stacking ensembles,NA
+R_2WpLptSq5iHRe9j,I have used tidymodels packages many times,I work in industry,Q5_6,15,Spatial machine learning ,NA
+R_2WpLptSq5iHRe9j,I have used tidymodels packages many times,I work in industry,Q5_10,5,Ordinal regression,NA
+R_2WpLptSq5iHRe9j,I have used tidymodels packages many times,I work in industry,Q5_12,0,Other,NA
+R_2AMV6mBAK09SaP7,I have used tidymodels packages many times,I work in industry,Q5_1,20,Sparse tibbles,NA
+R_2AMV6mBAK09SaP7,I have used tidymodels packages many times,I work in industry,Q5_2,20,Causal inference,NA
+R_2AMV6mBAK09SaP7,I have used tidymodels packages many times,I work in industry,Q5_3,10,Improve chattr,NA
+R_2AMV6mBAK09SaP7,I have used tidymodels packages many times,I work in industry,Q5_4,10,Cost-sensitive learning,NA
+R_2AMV6mBAK09SaP7,I have used tidymodels packages many times,I work in industry,Q5_5,15,Stacking ensembles,NA
+R_2AMV6mBAK09SaP7,I have used tidymodels packages many times,I work in industry,Q5_6,10,Spatial machine learning ,NA
+R_2AMV6mBAK09SaP7,I have used tidymodels packages many times,I work in industry,Q5_10,15,Ordinal regression,NA
+R_2AMV6mBAK09SaP7,I have used tidymodels packages many times,I work in industry,Q5_12,0,Other,NA
+R_5Gs98FjKdrz7Ykf,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_1,20,Sparse tibbles,NA
+R_5Gs98FjKdrz7Ykf,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_2,12,Causal inference,NA
+R_5Gs98FjKdrz7Ykf,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_3,2,Improve chattr,NA
+R_5Gs98FjKdrz7Ykf,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_4,6,Cost-sensitive learning,NA
+R_5Gs98FjKdrz7Ykf,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_5,10,Stacking ensembles,NA
+R_5Gs98FjKdrz7Ykf,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_6,30,Spatial machine learning ,NA
+R_5Gs98FjKdrz7Ykf,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_10,20,Ordinal regression,NA
+R_5Gs98FjKdrz7Ykf,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_12,0,Other,NA
+R_70OhbhLvtuLim6o,I have used tidymodels packages many times,I work in industry,Q5_1,20,Sparse tibbles,NA
+R_70OhbhLvtuLim6o,I have used tidymodels packages many times,I work in industry,Q5_2,80,Causal inference,NA
+R_70OhbhLvtuLim6o,I have used tidymodels packages many times,I work in industry,Q5_3,0,Improve chattr,NA
+R_70OhbhLvtuLim6o,I have used tidymodels packages many times,I work in industry,Q5_4,0,Cost-sensitive learning,NA
+R_70OhbhLvtuLim6o,I have used tidymodels packages many times,I work in industry,Q5_5,0,Stacking ensembles,NA
+R_70OhbhLvtuLim6o,I have used tidymodels packages many times,I work in industry,Q5_6,0,Spatial machine learning ,NA
+R_70OhbhLvtuLim6o,I have used tidymodels packages many times,I work in industry,Q5_10,0,Ordinal regression,NA
+R_70OhbhLvtuLim6o,I have used tidymodels packages many times,I work in industry,Q5_12,0,Other,NA
+R_3DA3NbGn85QjvS2,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_1,0,Sparse tibbles,NA
+R_3DA3NbGn85QjvS2,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_2,70,Causal inference,NA
+R_3DA3NbGn85QjvS2,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_3,0,Improve chattr,NA
+R_3DA3NbGn85QjvS2,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_4,0,Cost-sensitive learning,NA
+R_3DA3NbGn85QjvS2,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_5,10,Stacking ensembles,NA
+R_3DA3NbGn85QjvS2,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_6,10,Spatial machine learning ,NA
+R_3DA3NbGn85QjvS2,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_10,10,Ordinal regression,NA
+R_3DA3NbGn85QjvS2,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_12,0,Other,NA
+R_3CJo5c8aUB6tMtO,I have used tidymodels packages a few times,I am a hobbyist,Q5_1,50,Sparse tibbles,NA
+R_3CJo5c8aUB6tMtO,I have used tidymodels packages a few times,I am a hobbyist,Q5_2,0,Causal inference,NA
+R_3CJo5c8aUB6tMtO,I have used tidymodels packages a few times,I am a hobbyist,Q5_3,0,Improve chattr,NA
+R_3CJo5c8aUB6tMtO,I have used tidymodels packages a few times,I am a hobbyist,Q5_4,0,Cost-sensitive learning,NA
+R_3CJo5c8aUB6tMtO,I have used tidymodels packages a few times,I am a hobbyist,Q5_5,0,Stacking ensembles,NA
+R_3CJo5c8aUB6tMtO,I have used tidymodels packages a few times,I am a hobbyist,Q5_6,50,Spatial machine learning ,NA
+R_3CJo5c8aUB6tMtO,I have used tidymodels packages a few times,I am a hobbyist,Q5_10,0,Ordinal regression,NA
+R_3CJo5c8aUB6tMtO,I have used tidymodels packages a few times,I am a hobbyist,Q5_12,0,Other,NA
+R_5rOXs75eJxioQEa,I have used tidymodels packages many times,I work in industry,Q5_1,30,Sparse tibbles,NA
+R_5rOXs75eJxioQEa,I have used tidymodels packages many times,I work in industry,Q5_2,30,Causal inference,NA
+R_5rOXs75eJxioQEa,I have used tidymodels packages many times,I work in industry,Q5_3,20,Improve chattr,NA
+R_5rOXs75eJxioQEa,I have used tidymodels packages many times,I work in industry,Q5_4,0,Cost-sensitive learning,NA
+R_5rOXs75eJxioQEa,I have used tidymodels packages many times,I work in industry,Q5_5,10,Stacking ensembles,NA
+R_5rOXs75eJxioQEa,I have used tidymodels packages many times,I work in industry,Q5_6,0,Spatial machine learning ,NA
+R_5rOXs75eJxioQEa,I have used tidymodels packages many times,I work in industry,Q5_10,10,Ordinal regression,NA
+R_5rOXs75eJxioQEa,I have used tidymodels packages many times,I work in industry,Q5_12,0,Other,NA
+R_1sLLtSAm0KSdacV,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_1,0,Sparse tibbles,NA
+R_1sLLtSAm0KSdacV,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_2,25,Causal inference,NA
+R_1sLLtSAm0KSdacV,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_3,25,Improve chattr,NA
+R_1sLLtSAm0KSdacV,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_4,25,Cost-sensitive learning,NA
+R_1sLLtSAm0KSdacV,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_5,0,Stacking ensembles,NA
+R_1sLLtSAm0KSdacV,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_6,10,Spatial machine learning ,NA
+R_1sLLtSAm0KSdacV,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_10,10,Ordinal regression,NA
+R_1sLLtSAm0KSdacV,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_12,5,Other,"Add ""cube"" method to themis package."
+R_6q1XswgpfYsXLGe,I have used tidymodels packages a few times,I work in industry,Q5_1,10,Sparse tibbles,NA
+R_6q1XswgpfYsXLGe,I have used tidymodels packages a few times,I work in industry,Q5_2,20,Causal inference,NA
+R_6q1XswgpfYsXLGe,I have used tidymodels packages a few times,I work in industry,Q5_3,0,Improve chattr,NA
+R_6q1XswgpfYsXLGe,I have used tidymodels packages a few times,I work in industry,Q5_4,20,Cost-sensitive learning,NA
+R_6q1XswgpfYsXLGe,I have used tidymodels packages a few times,I work in industry,Q5_5,20,Stacking ensembles,NA
+R_6q1XswgpfYsXLGe,I have used tidymodels packages a few times,I work in industry,Q5_6,20,Spatial machine learning ,NA
+R_6q1XswgpfYsXLGe,I have used tidymodels packages a few times,I work in industry,Q5_10,10,Ordinal regression,NA
+R_6q1XswgpfYsXLGe,I have used tidymodels packages a few times,I work in industry,Q5_12,0,Other,NA
+R_4fdxTnoOi4vWR7X,I have used tidymodels packages many times,I work in industry,Q5_1,0,Sparse tibbles,NA
+R_4fdxTnoOi4vWR7X,I have used tidymodels packages many times,I work in industry,Q5_2,10,Causal inference,NA
+R_4fdxTnoOi4vWR7X,I have used tidymodels packages many times,I work in industry,Q5_3,20,Improve chattr,NA
+R_4fdxTnoOi4vWR7X,I have used tidymodels packages many times,I work in industry,Q5_4,10,Cost-sensitive learning,NA
+R_4fdxTnoOi4vWR7X,I have used tidymodels packages many times,I work in industry,Q5_5,50,Stacking ensembles,NA
+R_4fdxTnoOi4vWR7X,I have used tidymodels packages many times,I work in industry,Q5_6,0,Spatial machine learning ,NA
+R_4fdxTnoOi4vWR7X,I have used tidymodels packages many times,I work in industry,Q5_10,10,Ordinal regression,NA
+R_4fdxTnoOi4vWR7X,I have used tidymodels packages many times,I work in industry,Q5_12,0,Other,NA
+R_4q1vcgTFwAv3Zt6,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_1,0,Sparse tibbles,NA
+R_4q1vcgTFwAv3Zt6,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_2,100,Causal inference,NA
+R_4q1vcgTFwAv3Zt6,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_3,0,Improve chattr,NA
+R_4q1vcgTFwAv3Zt6,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_4,0,Cost-sensitive learning,NA
+R_4q1vcgTFwAv3Zt6,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_5,0,Stacking ensembles,NA
+R_4q1vcgTFwAv3Zt6,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_6,0,Spatial machine learning ,NA
+R_4q1vcgTFwAv3Zt6,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_10,0,Ordinal regression,NA
+R_4q1vcgTFwAv3Zt6,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_12,0,Other,NA
+R_2Nu5oDwCHWIUjnz,I have used tidymodels packages many times,I work in industry,Q5_1,10,Sparse tibbles,NA
+R_2Nu5oDwCHWIUjnz,I have used tidymodels packages many times,I work in industry,Q5_2,30,Causal inference,NA
+R_2Nu5oDwCHWIUjnz,I have used tidymodels packages many times,I work in industry,Q5_3,10,Improve chattr,NA
+R_2Nu5oDwCHWIUjnz,I have used tidymodels packages many times,I work in industry,Q5_4,10,Cost-sensitive learning,NA
+R_2Nu5oDwCHWIUjnz,I have used tidymodels packages many times,I work in industry,Q5_5,10,Stacking ensembles,NA
+R_2Nu5oDwCHWIUjnz,I have used tidymodels packages many times,I work in industry,Q5_6,10,Spatial machine learning ,NA
+R_2Nu5oDwCHWIUjnz,I have used tidymodels packages many times,I work in industry,Q5_10,15,Ordinal regression,NA
+R_2Nu5oDwCHWIUjnz,I have used tidymodels packages many times,I work in industry,Q5_12,5,Other,NA
+R_1UbXaH4a4pUNluu,I have never used tidymodels,"I am an academic, professor, and/or researcher",Q5_1,0,Sparse tibbles,NA
+R_1UbXaH4a4pUNluu,I have never used tidymodels,"I am an academic, professor, and/or researcher",Q5_2,100,Causal inference,NA
+R_1UbXaH4a4pUNluu,I have never used tidymodels,"I am an academic, professor, and/or researcher",Q5_3,0,Improve chattr,NA
+R_1UbXaH4a4pUNluu,I have never used tidymodels,"I am an academic, professor, and/or researcher",Q5_4,0,Cost-sensitive learning,NA
+R_1UbXaH4a4pUNluu,I have never used tidymodels,"I am an academic, professor, and/or researcher",Q5_5,0,Stacking ensembles,NA
+R_1UbXaH4a4pUNluu,I have never used tidymodels,"I am an academic, professor, and/or researcher",Q5_6,0,Spatial machine learning ,NA
+R_1UbXaH4a4pUNluu,I have never used tidymodels,"I am an academic, professor, and/or researcher",Q5_10,0,Ordinal regression,NA
+R_1UbXaH4a4pUNluu,I have never used tidymodels,"I am an academic, professor, and/or researcher",Q5_12,0,Other,NA
+R_22XC9odmNprAidC,I have used tidymodels packages many times,I work in industry,Q5_1,0,Sparse tibbles,NA
+R_22XC9odmNprAidC,I have used tidymodels packages many times,I work in industry,Q5_2,10,Causal inference,NA
+R_22XC9odmNprAidC,I have used tidymodels packages many times,I work in industry,Q5_3,10,Improve chattr,NA
+R_22XC9odmNprAidC,I have used tidymodels packages many times,I work in industry,Q5_4,0,Cost-sensitive learning,NA
+R_22XC9odmNprAidC,I have used tidymodels packages many times,I work in industry,Q5_5,15,Stacking ensembles,NA
+R_22XC9odmNprAidC,I have used tidymodels packages many times,I work in industry,Q5_6,0,Spatial machine learning ,NA
+R_22XC9odmNprAidC,I have used tidymodels packages many times,I work in industry,Q5_10,65,Ordinal regression,NA
+R_22XC9odmNprAidC,I have used tidymodels packages many times,I work in industry,Q5_12,0,Other,NA
+R_8PgRAxx3j4rO0rn,I have used tidymodels packages many times,I work in industry,Q5_1,5,Sparse tibbles,NA
+R_8PgRAxx3j4rO0rn,I have used tidymodels packages many times,I work in industry,Q5_2,10,Causal inference,NA
+R_8PgRAxx3j4rO0rn,I have used tidymodels packages many times,I work in industry,Q5_3,0,Improve chattr,NA
+R_8PgRAxx3j4rO0rn,I have used tidymodels packages many times,I work in industry,Q5_4,0,Cost-sensitive learning,NA
+R_8PgRAxx3j4rO0rn,I have used tidymodels packages many times,I work in industry,Q5_5,70,Stacking ensembles,NA
+R_8PgRAxx3j4rO0rn,I have used tidymodels packages many times,I work in industry,Q5_6,15,Spatial machine learning ,NA
+R_8PgRAxx3j4rO0rn,I have used tidymodels packages many times,I work in industry,Q5_10,0,Ordinal regression,NA
+R_8PgRAxx3j4rO0rn,I have used tidymodels packages many times,I work in industry,Q5_12,0,Other,NA
+R_7Md7lsLZLaXNNHH,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_1,0,Sparse tibbles,NA
+R_7Md7lsLZLaXNNHH,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_2,40,Causal inference,NA
+R_7Md7lsLZLaXNNHH,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_3,0,Improve chattr,NA
+R_7Md7lsLZLaXNNHH,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_4,0,Cost-sensitive learning,NA
+R_7Md7lsLZLaXNNHH,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_5,0,Stacking ensembles,NA
+R_7Md7lsLZLaXNNHH,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_6,0,Spatial machine learning ,NA
+R_7Md7lsLZLaXNNHH,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_10,20,Ordinal regression,NA
+R_7Md7lsLZLaXNNHH,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_12,40,Other,"Expanded support for Bayesian models, especially brms/Stan"
+R_3OTBokN05cbKpzI,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_1,5,Sparse tibbles,NA
+R_3OTBokN05cbKpzI,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_2,30,Causal inference,NA
+R_3OTBokN05cbKpzI,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_3,30,Improve chattr,NA
+R_3OTBokN05cbKpzI,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_4,5,Cost-sensitive learning,NA
+R_3OTBokN05cbKpzI,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_5,5,Stacking ensembles,NA
+R_3OTBokN05cbKpzI,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_6,20,Spatial machine learning ,NA
+R_3OTBokN05cbKpzI,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_10,5,Ordinal regression,NA
+R_3OTBokN05cbKpzI,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_12,0,Other,NA
+R_1IcJk8rPCfoEMTA,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_1,0,Sparse tibbles,NA
+R_1IcJk8rPCfoEMTA,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_2,0,Causal inference,NA
+R_1IcJk8rPCfoEMTA,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_3,30,Improve chattr,NA
+R_1IcJk8rPCfoEMTA,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_4,0,Cost-sensitive learning,NA
+R_1IcJk8rPCfoEMTA,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_5,20,Stacking ensembles,NA
+R_1IcJk8rPCfoEMTA,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_6,20,Spatial machine learning ,NA
+R_1IcJk8rPCfoEMTA,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_10,30,Ordinal regression,NA
+R_1IcJk8rPCfoEMTA,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_12,0,Other,NA
+R_7YoPON1HKdFgZBD,I have used tidymodels packages many times,I work in industry,Q5_1,0,Sparse tibbles,NA
+R_7YoPON1HKdFgZBD,I have used tidymodels packages many times,I work in industry,Q5_2,50,Causal inference,NA
+R_7YoPON1HKdFgZBD,I have used tidymodels packages many times,I work in industry,Q5_3,0,Improve chattr,NA
+R_7YoPON1HKdFgZBD,I have used tidymodels packages many times,I work in industry,Q5_4,0,Cost-sensitive learning,NA
+R_7YoPON1HKdFgZBD,I have used tidymodels packages many times,I work in industry,Q5_5,0,Stacking ensembles,NA
+R_7YoPON1HKdFgZBD,I have used tidymodels packages many times,I work in industry,Q5_6,50,Spatial machine learning ,NA
+R_7YoPON1HKdFgZBD,I have used tidymodels packages many times,I work in industry,Q5_10,0,Ordinal regression,NA
+R_7YoPON1HKdFgZBD,I have used tidymodels packages many times,I work in industry,Q5_12,0,Other,NA
+R_8OGXIRPeeejMIxt,I have used tidymodels packages a few times,I work in industry,Q5_1,0,Sparse tibbles,NA
+R_8OGXIRPeeejMIxt,I have used tidymodels packages a few times,I work in industry,Q5_2,25,Causal inference,NA
+R_8OGXIRPeeejMIxt,I have used tidymodels packages a few times,I work in industry,Q5_3,0,Improve chattr,NA
+R_8OGXIRPeeejMIxt,I have used tidymodels packages a few times,I work in industry,Q5_4,25,Cost-sensitive learning,NA
+R_8OGXIRPeeejMIxt,I have used tidymodels packages a few times,I work in industry,Q5_5,0,Stacking ensembles,NA
+R_8OGXIRPeeejMIxt,I have used tidymodels packages a few times,I work in industry,Q5_6,0,Spatial machine learning ,NA
+R_8OGXIRPeeejMIxt,I have used tidymodels packages a few times,I work in industry,Q5_10,50,Ordinal regression,NA
+R_8OGXIRPeeejMIxt,I have used tidymodels packages a few times,I work in industry,Q5_12,0,Other,NA
+R_7FJSUuePkV9jv6V,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_1,0,Sparse tibbles,NA
+R_7FJSUuePkV9jv6V,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_2,100,Causal inference,NA
+R_7FJSUuePkV9jv6V,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_3,0,Improve chattr,NA
+R_7FJSUuePkV9jv6V,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_4,0,Cost-sensitive learning,NA
+R_7FJSUuePkV9jv6V,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_5,0,Stacking ensembles,NA
+R_7FJSUuePkV9jv6V,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_6,0,Spatial machine learning ,NA
+R_7FJSUuePkV9jv6V,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_10,0,Ordinal regression,NA
+R_7FJSUuePkV9jv6V,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_12,0,Other,NA
+R_5P0Q5ULb4Z5PgtI,I have used tidymodels packages a few times,I work in industry,Q5_1,15,Sparse tibbles,NA
+R_5P0Q5ULb4Z5PgtI,I have used tidymodels packages a few times,I work in industry,Q5_2,40,Causal inference,NA
+R_5P0Q5ULb4Z5PgtI,I have used tidymodels packages a few times,I work in industry,Q5_3,20,Improve chattr,NA
+R_5P0Q5ULb4Z5PgtI,I have used tidymodels packages a few times,I work in industry,Q5_4,10,Cost-sensitive learning,NA
+R_5P0Q5ULb4Z5PgtI,I have used tidymodels packages a few times,I work in industry,Q5_5,5,Stacking ensembles,NA
+R_5P0Q5ULb4Z5PgtI,I have used tidymodels packages a few times,I work in industry,Q5_6,0,Spatial machine learning ,NA
+R_5P0Q5ULb4Z5PgtI,I have used tidymodels packages a few times,I work in industry,Q5_10,10,Ordinal regression,NA
+R_5P0Q5ULb4Z5PgtI,I have used tidymodels packages a few times,I work in industry,Q5_12,0,Other,NA
+R_2upwkho1wvzJOZs,I have used tidymodels packages a few times,I work in industry,Q5_1,0,Sparse tibbles,NA
+R_2upwkho1wvzJOZs,I have used tidymodels packages a few times,I work in industry,Q5_2,20,Causal inference,NA
+R_2upwkho1wvzJOZs,I have used tidymodels packages a few times,I work in industry,Q5_3,15,Improve chattr,NA
+R_2upwkho1wvzJOZs,I have used tidymodels packages a few times,I work in industry,Q5_4,10,Cost-sensitive learning,NA
+R_2upwkho1wvzJOZs,I have used tidymodels packages a few times,I work in industry,Q5_5,0,Stacking ensembles,NA
+R_2upwkho1wvzJOZs,I have used tidymodels packages a few times,I work in industry,Q5_6,25,Spatial machine learning ,NA
+R_2upwkho1wvzJOZs,I have used tidymodels packages a few times,I work in industry,Q5_10,10,Ordinal regression,NA
+R_2upwkho1wvzJOZs,I have used tidymodels packages a few times,I work in industry,Q5_12,20,Other,usethis-like workflow (shinymodels / usemodels
+R_3AQCBo4X1R5rOpV,I have used tidymodels packages many times,I work in industry,Q5_1,0,Sparse tibbles,NA
+R_3AQCBo4X1R5rOpV,I have used tidymodels packages many times,I work in industry,Q5_2,20,Causal inference,NA
+R_3AQCBo4X1R5rOpV,I have used tidymodels packages many times,I work in industry,Q5_3,10,Improve chattr,NA
+R_3AQCBo4X1R5rOpV,I have used tidymodels packages many times,I work in industry,Q5_4,0,Cost-sensitive learning,NA
+R_3AQCBo4X1R5rOpV,I have used tidymodels packages many times,I work in industry,Q5_5,10,Stacking ensembles,NA
+R_3AQCBo4X1R5rOpV,I have used tidymodels packages many times,I work in industry,Q5_6,0,Spatial machine learning ,NA
+R_3AQCBo4X1R5rOpV,I have used tidymodels packages many times,I work in industry,Q5_10,0,Ordinal regression,NA
+R_3AQCBo4X1R5rOpV,I have used tidymodels packages many times,I work in industry,Q5_12,60,Other,Integration with Spark ML Models
+R_7wnU6SRYIN3IoLs,I have used tidymodels packages many times,I am a hobbyist,Q5_1,30,Sparse tibbles,NA
+R_7wnU6SRYIN3IoLs,I have used tidymodels packages many times,I am a hobbyist,Q5_2,10,Causal inference,NA
+R_7wnU6SRYIN3IoLs,I have used tidymodels packages many times,I am a hobbyist,Q5_3,0,Improve chattr,NA
+R_7wnU6SRYIN3IoLs,I have used tidymodels packages many times,I am a hobbyist,Q5_4,10,Cost-sensitive learning,NA
+R_7wnU6SRYIN3IoLs,I have used tidymodels packages many times,I am a hobbyist,Q5_5,50,Stacking ensembles,NA
+R_7wnU6SRYIN3IoLs,I have used tidymodels packages many times,I am a hobbyist,Q5_6,0,Spatial machine learning ,NA
+R_7wnU6SRYIN3IoLs,I have used tidymodels packages many times,I am a hobbyist,Q5_10,0,Ordinal regression,NA
+R_7wnU6SRYIN3IoLs,I have used tidymodels packages many times,I am a hobbyist,Q5_12,0,Other,NA
+R_1HA1nDtZuazW6nU,I have used tidymodels packages a few times,I am a hobbyist,Q5_1,0,Sparse tibbles,NA
+R_1HA1nDtZuazW6nU,I have used tidymodels packages a few times,I am a hobbyist,Q5_2,10,Causal inference,NA
+R_1HA1nDtZuazW6nU,I have used tidymodels packages a few times,I am a hobbyist,Q5_3,0,Improve chattr,NA
+R_1HA1nDtZuazW6nU,I have used tidymodels packages a few times,I am a hobbyist,Q5_4,20,Cost-sensitive learning,NA
+R_1HA1nDtZuazW6nU,I have used tidymodels packages a few times,I am a hobbyist,Q5_5,40,Stacking ensembles,NA
+R_1HA1nDtZuazW6nU,I have used tidymodels packages a few times,I am a hobbyist,Q5_6,10,Spatial machine learning ,NA
+R_1HA1nDtZuazW6nU,I have used tidymodels packages a few times,I am a hobbyist,Q5_10,20,Ordinal regression,NA
+R_1HA1nDtZuazW6nU,I have used tidymodels packages a few times,I am a hobbyist,Q5_12,0,Other,NA
+R_4QYP6b3tACIwTxD,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_1,0,Sparse tibbles,NA
+R_4QYP6b3tACIwTxD,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_2,0,Causal inference,NA
+R_4QYP6b3tACIwTxD,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_3,0,Improve chattr,NA
+R_4QYP6b3tACIwTxD,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_4,20,Cost-sensitive learning,NA
+R_4QYP6b3tACIwTxD,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_5,40,Stacking ensembles,NA
+R_4QYP6b3tACIwTxD,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_6,0,Spatial machine learning ,NA
+R_4QYP6b3tACIwTxD,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_10,40,Ordinal regression,NA
+R_4QYP6b3tACIwTxD,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_12,0,Other,NA
+R_8D82JF54HQGAOB3,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_1,0,Sparse tibbles,NA
+R_8D82JF54HQGAOB3,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_2,50,Causal inference,NA
+R_8D82JF54HQGAOB3,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_3,0,Improve chattr,NA
+R_8D82JF54HQGAOB3,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_4,0,Cost-sensitive learning,NA
+R_8D82JF54HQGAOB3,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_5,0,Stacking ensembles,NA
+R_8D82JF54HQGAOB3,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_6,0,Spatial machine learning ,NA
+R_8D82JF54HQGAOB3,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_10,50,Ordinal regression,NA
+R_8D82JF54HQGAOB3,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_12,0,Other,NA
+R_7wc7SIZhSVo3I69,I have used tidymodels packages a few times,I work in industry,Q5_1,5,Sparse tibbles,NA
+R_7wc7SIZhSVo3I69,I have used tidymodels packages a few times,I work in industry,Q5_2,35,Causal inference,NA
+R_7wc7SIZhSVo3I69,I have used tidymodels packages a few times,I work in industry,Q5_3,10,Improve chattr,NA
+R_7wc7SIZhSVo3I69,I have used tidymodels packages a few times,I work in industry,Q5_4,10,Cost-sensitive learning,NA
+R_7wc7SIZhSVo3I69,I have used tidymodels packages a few times,I work in industry,Q5_5,20,Stacking ensembles,NA
+R_7wc7SIZhSVo3I69,I have used tidymodels packages a few times,I work in industry,Q5_6,10,Spatial machine learning ,NA
+R_7wc7SIZhSVo3I69,I have used tidymodels packages a few times,I work in industry,Q5_10,10,Ordinal regression,NA
+R_7wc7SIZhSVo3I69,I have used tidymodels packages a few times,I work in industry,Q5_12,0,Other,NA
+R_1ruPE8SGUIAZABz,I have used tidymodels packages a few times,I work in industry,Q5_1,0,Sparse tibbles,NA
+R_1ruPE8SGUIAZABz,I have used tidymodels packages a few times,I work in industry,Q5_2,50,Causal inference,NA
+R_1ruPE8SGUIAZABz,I have used tidymodels packages a few times,I work in industry,Q5_3,0,Improve chattr,NA
+R_1ruPE8SGUIAZABz,I have used tidymodels packages a few times,I work in industry,Q5_4,0,Cost-sensitive learning,NA
+R_1ruPE8SGUIAZABz,I have used tidymodels packages a few times,I work in industry,Q5_5,30,Stacking ensembles,NA
+R_1ruPE8SGUIAZABz,I have used tidymodels packages a few times,I work in industry,Q5_6,0,Spatial machine learning ,NA
+R_1ruPE8SGUIAZABz,I have used tidymodels packages a few times,I work in industry,Q5_10,20,Ordinal regression,NA
+R_1ruPE8SGUIAZABz,I have used tidymodels packages a few times,I work in industry,Q5_12,0,Other,NA
+R_1s0XjGRAXeAWr5h,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_1,0,Sparse tibbles,NA
+R_1s0XjGRAXeAWr5h,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_2,20,Causal inference,NA
+R_1s0XjGRAXeAWr5h,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_3,0,Improve chattr,NA
+R_1s0XjGRAXeAWr5h,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_4,20,Cost-sensitive learning,NA
+R_1s0XjGRAXeAWr5h,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_5,20,Stacking ensembles,NA
+R_1s0XjGRAXeAWr5h,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_6,0,Spatial machine learning ,NA
+R_1s0XjGRAXeAWr5h,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_10,40,Ordinal regression,NA
+R_1s0XjGRAXeAWr5h,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_12,0,Other,NA
+R_3GdCAKjt2DmZ2i6,I have used tidymodels packages a few times,I work in industry,Q5_1,10,Sparse tibbles,NA
+R_3GdCAKjt2DmZ2i6,I have used tidymodels packages a few times,I work in industry,Q5_2,50,Causal inference,NA
+R_3GdCAKjt2DmZ2i6,I have used tidymodels packages a few times,I work in industry,Q5_3,10,Improve chattr,NA
+R_3GdCAKjt2DmZ2i6,I have used tidymodels packages a few times,I work in industry,Q5_4,0,Cost-sensitive learning,NA
+R_3GdCAKjt2DmZ2i6,I have used tidymodels packages a few times,I work in industry,Q5_5,30,Stacking ensembles,NA
+R_3GdCAKjt2DmZ2i6,I have used tidymodels packages a few times,I work in industry,Q5_6,0,Spatial machine learning ,NA
+R_3GdCAKjt2DmZ2i6,I have used tidymodels packages a few times,I work in industry,Q5_10,0,Ordinal regression,NA
+R_3GdCAKjt2DmZ2i6,I have used tidymodels packages a few times,I work in industry,Q5_12,0,Other,NA
+R_7gNoSRK6DjOFIqE,I have never used tidymodels,I work in industry,Q5_1,75,Sparse tibbles,NA
+R_7gNoSRK6DjOFIqE,I have never used tidymodels,I work in industry,Q5_2,25,Causal inference,NA
+R_7gNoSRK6DjOFIqE,I have never used tidymodels,I work in industry,Q5_3,0,Improve chattr,NA
+R_7gNoSRK6DjOFIqE,I have never used tidymodels,I work in industry,Q5_4,0,Cost-sensitive learning,NA
+R_7gNoSRK6DjOFIqE,I have never used tidymodels,I work in industry,Q5_5,0,Stacking ensembles,NA
+R_7gNoSRK6DjOFIqE,I have never used tidymodels,I work in industry,Q5_6,0,Spatial machine learning ,NA
+R_7gNoSRK6DjOFIqE,I have never used tidymodels,I work in industry,Q5_10,0,Ordinal regression,NA
+R_7gNoSRK6DjOFIqE,I have never used tidymodels,I work in industry,Q5_12,0,Other,NA
+R_7OMJTzA84g8aewZ,I have used tidymodels packages many times,I work in industry,Q5_1,0,Sparse tibbles,NA
+R_7OMJTzA84g8aewZ,I have used tidymodels packages many times,I work in industry,Q5_2,60,Causal inference,NA
+R_7OMJTzA84g8aewZ,I have used tidymodels packages many times,I work in industry,Q5_3,0,Improve chattr,NA
+R_7OMJTzA84g8aewZ,I have used tidymodels packages many times,I work in industry,Q5_4,0,Cost-sensitive learning,NA
+R_7OMJTzA84g8aewZ,I have used tidymodels packages many times,I work in industry,Q5_5,20,Stacking ensembles,NA
+R_7OMJTzA84g8aewZ,I have used tidymodels packages many times,I work in industry,Q5_6,0,Spatial machine learning ,NA
+R_7OMJTzA84g8aewZ,I have used tidymodels packages many times,I work in industry,Q5_10,10,Ordinal regression,NA
+R_7OMJTzA84g8aewZ,I have used tidymodels packages many times,I work in industry,Q5_12,10,Other,Tidymodels for Python
+R_631YhW6y9Z0XbtV,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_1,0,Sparse tibbles,NA
+R_631YhW6y9Z0XbtV,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_2,100,Causal inference,NA
+R_631YhW6y9Z0XbtV,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_3,0,Improve chattr,NA
+R_631YhW6y9Z0XbtV,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_4,0,Cost-sensitive learning,NA
+R_631YhW6y9Z0XbtV,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_5,0,Stacking ensembles,NA
+R_631YhW6y9Z0XbtV,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_6,0,Spatial machine learning ,NA
+R_631YhW6y9Z0XbtV,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_10,0,Ordinal regression,NA
+R_631YhW6y9Z0XbtV,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_12,0,Other,NA
+R_6gSc2s9WTQxMLuh,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_1,0,Sparse tibbles,NA
+R_6gSc2s9WTQxMLuh,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_2,70,Causal inference,NA
+R_6gSc2s9WTQxMLuh,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_3,10,Improve chattr,NA
+R_6gSc2s9WTQxMLuh,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_4,0,Cost-sensitive learning,NA
+R_6gSc2s9WTQxMLuh,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_5,0,Stacking ensembles,NA
+R_6gSc2s9WTQxMLuh,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_6,0,Spatial machine learning ,NA
+R_6gSc2s9WTQxMLuh,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_10,20,Ordinal regression,NA
+R_6gSc2s9WTQxMLuh,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_12,0,Other,NA
+R_39mFC2G8ZL6iw3n,I have used tidymodels packages many times,I work in industry,Q5_1,0,Sparse tibbles,NA
+R_39mFC2G8ZL6iw3n,I have used tidymodels packages many times,I work in industry,Q5_2,70,Causal inference,NA
+R_39mFC2G8ZL6iw3n,I have used tidymodels packages many times,I work in industry,Q5_3,0,Improve chattr,NA
+R_39mFC2G8ZL6iw3n,I have used tidymodels packages many times,I work in industry,Q5_4,0,Cost-sensitive learning,NA
+R_39mFC2G8ZL6iw3n,I have used tidymodels packages many times,I work in industry,Q5_5,0,Stacking ensembles,NA
+R_39mFC2G8ZL6iw3n,I have used tidymodels packages many times,I work in industry,Q5_6,0,Spatial machine learning ,NA
+R_39mFC2G8ZL6iw3n,I have used tidymodels packages many times,I work in industry,Q5_10,30,Ordinal regression,NA
+R_39mFC2G8ZL6iw3n,I have used tidymodels packages many times,I work in industry,Q5_12,0,Other,NA
+R_53wgYbIfM0U0FtT,I have used tidymodels packages many times,I work in industry,Q5_1,0,Sparse tibbles,NA
+R_53wgYbIfM0U0FtT,I have used tidymodels packages many times,I work in industry,Q5_2,0,Causal inference,NA
+R_53wgYbIfM0U0FtT,I have used tidymodels packages many times,I work in industry,Q5_3,0,Improve chattr,NA
+R_53wgYbIfM0U0FtT,I have used tidymodels packages many times,I work in industry,Q5_4,25,Cost-sensitive learning,NA
+R_53wgYbIfM0U0FtT,I have used tidymodels packages many times,I work in industry,Q5_5,25,Stacking ensembles,NA
+R_53wgYbIfM0U0FtT,I have used tidymodels packages many times,I work in industry,Q5_6,0,Spatial machine learning ,NA
+R_53wgYbIfM0U0FtT,I have used tidymodels packages many times,I work in industry,Q5_10,25,Ordinal regression,NA
+R_53wgYbIfM0U0FtT,I have used tidymodels packages many times,I work in industry,Q5_12,25,Other,Deep learning
+R_2qKbbdGfOL8pezk,I have used tidymodels packages a few times,I work in industry,Q5_1,20,Sparse tibbles,NA
+R_2qKbbdGfOL8pezk,I have used tidymodels packages a few times,I work in industry,Q5_2,15,Causal inference,NA
+R_2qKbbdGfOL8pezk,I have used tidymodels packages a few times,I work in industry,Q5_3,15,Improve chattr,NA
+R_2qKbbdGfOL8pezk,I have used tidymodels packages a few times,I work in industry,Q5_4,0,Cost-sensitive learning,NA
+R_2qKbbdGfOL8pezk,I have used tidymodels packages a few times,I work in industry,Q5_5,10,Stacking ensembles,NA
+R_2qKbbdGfOL8pezk,I have used tidymodels packages a few times,I work in industry,Q5_6,10,Spatial machine learning ,NA
+R_2qKbbdGfOL8pezk,I have used tidymodels packages a few times,I work in industry,Q5_10,0,Ordinal regression,NA
+R_2qKbbdGfOL8pezk,I have used tidymodels packages a few times,I work in industry,Q5_12,30,Other,Supporting Torch-based models
+R_7WST0W897yNJgGD,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_1,0,Sparse tibbles,NA
+R_7WST0W897yNJgGD,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_2,70,Causal inference,NA
+R_7WST0W897yNJgGD,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_3,20,Improve chattr,NA
+R_7WST0W897yNJgGD,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_4,0,Cost-sensitive learning,NA
+R_7WST0W897yNJgGD,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_5,10,Stacking ensembles,NA
+R_7WST0W897yNJgGD,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_6,0,Spatial machine learning ,NA
+R_7WST0W897yNJgGD,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_10,0,Ordinal regression,NA
+R_7WST0W897yNJgGD,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_12,0,Other,NA
+R_3JgY2D9p9hmSITL,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_1,0,Sparse tibbles,NA
+R_3JgY2D9p9hmSITL,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_2,50,Causal inference,NA
+R_3JgY2D9p9hmSITL,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_3,50,Improve chattr,NA
+R_3JgY2D9p9hmSITL,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_4,0,Cost-sensitive learning,NA
+R_3JgY2D9p9hmSITL,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_5,0,Stacking ensembles,NA
+R_3JgY2D9p9hmSITL,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_6,0,Spatial machine learning ,NA
+R_3JgY2D9p9hmSITL,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_10,0,Ordinal regression,NA
+R_3JgY2D9p9hmSITL,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_12,0,Other,NA
+R_5MG5nnIhmYYCTzr,I have used tidymodels packages a few times,I work in industry,Q5_1,0,Sparse tibbles,NA
+R_5MG5nnIhmYYCTzr,I have used tidymodels packages a few times,I work in industry,Q5_2,20,Causal inference,NA
+R_5MG5nnIhmYYCTzr,I have used tidymodels packages a few times,I work in industry,Q5_3,40,Improve chattr,NA
+R_5MG5nnIhmYYCTzr,I have used tidymodels packages a few times,I work in industry,Q5_4,0,Cost-sensitive learning,NA
+R_5MG5nnIhmYYCTzr,I have used tidymodels packages a few times,I work in industry,Q5_5,0,Stacking ensembles,NA
+R_5MG5nnIhmYYCTzr,I have used tidymodels packages a few times,I work in industry,Q5_6,0,Spatial machine learning ,NA
+R_5MG5nnIhmYYCTzr,I have used tidymodels packages a few times,I work in industry,Q5_10,40,Ordinal regression,NA
+R_5MG5nnIhmYYCTzr,I have used tidymodels packages a few times,I work in industry,Q5_12,0,Other,NA
+R_1zj1e0uxxAmtc6B,I have used tidymodels packages many times,I am a hobbyist,Q5_1,10,Sparse tibbles,NA
+R_1zj1e0uxxAmtc6B,I have used tidymodels packages many times,I am a hobbyist,Q5_2,10,Causal inference,NA
+R_1zj1e0uxxAmtc6B,I have used tidymodels packages many times,I am a hobbyist,Q5_3,0,Improve chattr,NA
+R_1zj1e0uxxAmtc6B,I have used tidymodels packages many times,I am a hobbyist,Q5_4,10,Cost-sensitive learning,NA
+R_1zj1e0uxxAmtc6B,I have used tidymodels packages many times,I am a hobbyist,Q5_5,20,Stacking ensembles,NA
+R_1zj1e0uxxAmtc6B,I have used tidymodels packages many times,I am a hobbyist,Q5_6,10,Spatial machine learning ,NA
+R_1zj1e0uxxAmtc6B,I have used tidymodels packages many times,I am a hobbyist,Q5_10,20,Ordinal regression,NA
+R_1zj1e0uxxAmtc6B,I have used tidymodels packages many times,I am a hobbyist,Q5_12,20,Other,Implement Conditional Logistic Regression
+R_7AS80c6LHCsQeJH,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_1,10,Sparse tibbles,NA
+R_7AS80c6LHCsQeJH,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_2,40,Causal inference,NA
+R_7AS80c6LHCsQeJH,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_3,0,Improve chattr,NA
+R_7AS80c6LHCsQeJH,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_4,0,Cost-sensitive learning,NA
+R_7AS80c6LHCsQeJH,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_5,20,Stacking ensembles,NA
+R_7AS80c6LHCsQeJH,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_6,10,Spatial machine learning ,NA
+R_7AS80c6LHCsQeJH,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_10,20,Ordinal regression,NA
+R_7AS80c6LHCsQeJH,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_12,0,Other,NA
+R_2MhbMXTuD8iscdH,I have never used tidymodels,"I am an academic, professor, and/or researcher",Q5_1,0,Sparse tibbles,NA
+R_2MhbMXTuD8iscdH,I have never used tidymodels,"I am an academic, professor, and/or researcher",Q5_2,0,Causal inference,NA
+R_2MhbMXTuD8iscdH,I have never used tidymodels,"I am an academic, professor, and/or researcher",Q5_3,0,Improve chattr,NA
+R_2MhbMXTuD8iscdH,I have never used tidymodels,"I am an academic, professor, and/or researcher",Q5_4,0,Cost-sensitive learning,NA
+R_2MhbMXTuD8iscdH,I have never used tidymodels,"I am an academic, professor, and/or researcher",Q5_5,0,Stacking ensembles,NA
+R_2MhbMXTuD8iscdH,I have never used tidymodels,"I am an academic, professor, and/or researcher",Q5_6,0,Spatial machine learning ,NA
+R_2MhbMXTuD8iscdH,I have never used tidymodels,"I am an academic, professor, and/or researcher",Q5_10,0,Ordinal regression,NA
+R_2MhbMXTuD8iscdH,I have never used tidymodels,"I am an academic, professor, and/or researcher",Q5_12,100,Other,censored
+R_7hGdR6Avqdz0UqR,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_1,50,Sparse tibbles,NA
+R_7hGdR6Avqdz0UqR,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_2,0,Causal inference,NA
+R_7hGdR6Avqdz0UqR,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_3,0,Improve chattr,NA
+R_7hGdR6Avqdz0UqR,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_4,0,Cost-sensitive learning,NA
+R_7hGdR6Avqdz0UqR,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_5,25,Stacking ensembles,NA
+R_7hGdR6Avqdz0UqR,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_6,25,Spatial machine learning ,NA
+R_7hGdR6Avqdz0UqR,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_10,0,Ordinal regression,NA
+R_7hGdR6Avqdz0UqR,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_12,0,Other,NA
+R_1xE07ZtX7SXI9CI,I have used tidymodels packages many times,I work in industry,Q5_1,0,Sparse tibbles,NA
+R_1xE07ZtX7SXI9CI,I have used tidymodels packages many times,I work in industry,Q5_2,10,Causal inference,NA
+R_1xE07ZtX7SXI9CI,I have used tidymodels packages many times,I work in industry,Q5_3,0,Improve chattr,NA
+R_1xE07ZtX7SXI9CI,I have used tidymodels packages many times,I work in industry,Q5_4,0,Cost-sensitive learning,NA
+R_1xE07ZtX7SXI9CI,I have used tidymodels packages many times,I work in industry,Q5_5,0,Stacking ensembles,NA
+R_1xE07ZtX7SXI9CI,I have used tidymodels packages many times,I work in industry,Q5_6,0,Spatial machine learning ,NA
+R_1xE07ZtX7SXI9CI,I have used tidymodels packages many times,I work in industry,Q5_10,0,Ordinal regression,NA
+R_1xE07ZtX7SXI9CI,I have used tidymodels packages many times,I work in industry,Q5_12,90,Other,Nested cross validation hyperparameter tuning
+R_2n9tuO3aGxXos1s,I have used tidymodels packages many times,I work in industry,Q5_1,0,Sparse tibbles,NA
+R_2n9tuO3aGxXos1s,I have used tidymodels packages many times,I work in industry,Q5_2,20,Causal inference,NA
+R_2n9tuO3aGxXos1s,I have used tidymodels packages many times,I work in industry,Q5_3,20,Improve chattr,NA
+R_2n9tuO3aGxXos1s,I have used tidymodels packages many times,I work in industry,Q5_4,20,Cost-sensitive learning,NA
+R_2n9tuO3aGxXos1s,I have used tidymodels packages many times,I work in industry,Q5_5,10,Stacking ensembles,NA
+R_2n9tuO3aGxXos1s,I have used tidymodels packages many times,I work in industry,Q5_6,0,Spatial machine learning ,NA
+R_2n9tuO3aGxXos1s,I have used tidymodels packages many times,I work in industry,Q5_10,10,Ordinal regression,NA
+R_2n9tuO3aGxXos1s,I have used tidymodels packages many times,I work in industry,Q5_12,20,Other,precision on cross validation is not supported
+R_2WuqTkThqEidt5r,I have used tidymodels packages many times,I work in industry,Q5_1,0,Sparse tibbles,NA
+R_2WuqTkThqEidt5r,I have used tidymodels packages many times,I work in industry,Q5_2,30,Causal inference,NA
+R_2WuqTkThqEidt5r,I have used tidymodels packages many times,I work in industry,Q5_3,0,Improve chattr,NA
+R_2WuqTkThqEidt5r,I have used tidymodels packages many times,I work in industry,Q5_4,0,Cost-sensitive learning,NA
+R_2WuqTkThqEidt5r,I have used tidymodels packages many times,I work in industry,Q5_5,0,Stacking ensembles,NA
+R_2WuqTkThqEidt5r,I have used tidymodels packages many times,I work in industry,Q5_6,0,Spatial machine learning ,NA
+R_2WuqTkThqEidt5r,I have used tidymodels packages many times,I work in industry,Q5_10,30,Ordinal regression,NA
+R_2WuqTkThqEidt5r,I have used tidymodels packages many times,I work in industry,Q5_12,40,Other,survival analysis
+R_8PcY1RdhJ5AdppI,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_1,0,Sparse tibbles,NA
+R_8PcY1RdhJ5AdppI,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_2,0,Causal inference,NA
+R_8PcY1RdhJ5AdppI,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_3,0,Improve chattr,NA
+R_8PcY1RdhJ5AdppI,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_4,0,Cost-sensitive learning,NA
+R_8PcY1RdhJ5AdppI,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_5,0,Stacking ensembles,NA
+R_8PcY1RdhJ5AdppI,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_6,0,Spatial machine learning ,NA
+R_8PcY1RdhJ5AdppI,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_10,100,Ordinal regression,NA
+R_8PcY1RdhJ5AdppI,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_12,0,Other,NA
+R_233M49bHYs1GxKp,I have used tidymodels packages a few times,I work in industry,Q5_1,20,Sparse tibbles,NA
+R_233M49bHYs1GxKp,I have used tidymodels packages a few times,I work in industry,Q5_2,50,Causal inference,NA
+R_233M49bHYs1GxKp,I have used tidymodels packages a few times,I work in industry,Q5_3,0,Improve chattr,NA
+R_233M49bHYs1GxKp,I have used tidymodels packages a few times,I work in industry,Q5_4,0,Cost-sensitive learning,NA
+R_233M49bHYs1GxKp,I have used tidymodels packages a few times,I work in industry,Q5_5,20,Stacking ensembles,NA
+R_233M49bHYs1GxKp,I have used tidymodels packages a few times,I work in industry,Q5_6,10,Spatial machine learning ,NA
+R_233M49bHYs1GxKp,I have used tidymodels packages a few times,I work in industry,Q5_10,0,Ordinal regression,NA
+R_233M49bHYs1GxKp,I have used tidymodels packages a few times,I work in industry,Q5_12,0,Other,NA
+R_8O8nRJ650eUl9El,I have used tidymodels packages a few times,I work in industry,Q5_1,20,Sparse tibbles,NA
+R_8O8nRJ650eUl9El,I have used tidymodels packages a few times,I work in industry,Q5_2,10,Causal inference,NA
+R_8O8nRJ650eUl9El,I have used tidymodels packages a few times,I work in industry,Q5_3,30,Improve chattr,NA
+R_8O8nRJ650eUl9El,I have used tidymodels packages a few times,I work in industry,Q5_4,10,Cost-sensitive learning,NA
+R_8O8nRJ650eUl9El,I have used tidymodels packages a few times,I work in industry,Q5_5,0,Stacking ensembles,NA
+R_8O8nRJ650eUl9El,I have used tidymodels packages a few times,I work in industry,Q5_6,30,Spatial machine learning ,NA
+R_8O8nRJ650eUl9El,I have used tidymodels packages a few times,I work in industry,Q5_10,0,Ordinal regression,NA
+R_8O8nRJ650eUl9El,I have used tidymodels packages a few times,I work in industry,Q5_12,0,Other,NA
+R_4QWEgsm5iR3kSPp,I have used tidymodels packages many times,I work in industry,Q5_1,0,Sparse tibbles,NA
+R_4QWEgsm5iR3kSPp,I have used tidymodels packages many times,I work in industry,Q5_2,30,Causal inference,NA
+R_4QWEgsm5iR3kSPp,I have used tidymodels packages many times,I work in industry,Q5_3,20,Improve chattr,NA
+R_4QWEgsm5iR3kSPp,I have used tidymodels packages many times,I work in industry,Q5_4,10,Cost-sensitive learning,NA
+R_4QWEgsm5iR3kSPp,I have used tidymodels packages many times,I work in industry,Q5_5,20,Stacking ensembles,NA
+R_4QWEgsm5iR3kSPp,I have used tidymodels packages many times,I work in industry,Q5_6,0,Spatial machine learning ,NA
+R_4QWEgsm5iR3kSPp,I have used tidymodels packages many times,I work in industry,Q5_10,20,Ordinal regression,NA
+R_4QWEgsm5iR3kSPp,I have used tidymodels packages many times,I work in industry,Q5_12,0,Other,NA
+R_14vmS6XuO5pS6Tq,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_1,0,Sparse tibbles,NA
+R_14vmS6XuO5pS6Tq,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_2,30,Causal inference,NA
+R_14vmS6XuO5pS6Tq,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_3,10,Improve chattr,NA
+R_14vmS6XuO5pS6Tq,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_4,0,Cost-sensitive learning,NA
+R_14vmS6XuO5pS6Tq,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_5,10,Stacking ensembles,NA
+R_14vmS6XuO5pS6Tq,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_6,40,Spatial machine learning ,NA
+R_14vmS6XuO5pS6Tq,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_10,10,Ordinal regression,NA
+R_14vmS6XuO5pS6Tq,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_12,0,Other,NA
+R_2CwC7mfUb1wJdB3,I have used tidymodels packages many times,I work in industry,Q5_1,40,Sparse tibbles,NA
+R_2CwC7mfUb1wJdB3,I have used tidymodels packages many times,I work in industry,Q5_2,20,Causal inference,NA
+R_2CwC7mfUb1wJdB3,I have used tidymodels packages many times,I work in industry,Q5_3,20,Improve chattr,NA
+R_2CwC7mfUb1wJdB3,I have used tidymodels packages many times,I work in industry,Q5_4,0,Cost-sensitive learning,NA
+R_2CwC7mfUb1wJdB3,I have used tidymodels packages many times,I work in industry,Q5_5,0,Stacking ensembles,NA
+R_2CwC7mfUb1wJdB3,I have used tidymodels packages many times,I work in industry,Q5_6,20,Spatial machine learning ,NA
+R_2CwC7mfUb1wJdB3,I have used tidymodels packages many times,I work in industry,Q5_10,0,Ordinal regression,NA
+R_2CwC7mfUb1wJdB3,I have used tidymodels packages many times,I work in industry,Q5_12,0,Other,NA
+R_6dZx0yvvpGqV1kw,I have used tidymodels packages many times,I am a student,Q5_1,20,Sparse tibbles,NA
+R_6dZx0yvvpGqV1kw,I have used tidymodels packages many times,I am a student,Q5_2,80,Causal inference,NA
+R_6dZx0yvvpGqV1kw,I have used tidymodels packages many times,I am a student,Q5_3,0,Improve chattr,NA
+R_6dZx0yvvpGqV1kw,I have used tidymodels packages many times,I am a student,Q5_4,0,Cost-sensitive learning,NA
+R_6dZx0yvvpGqV1kw,I have used tidymodels packages many times,I am a student,Q5_5,0,Stacking ensembles,NA
+R_6dZx0yvvpGqV1kw,I have used tidymodels packages many times,I am a student,Q5_6,0,Spatial machine learning ,NA
+R_6dZx0yvvpGqV1kw,I have used tidymodels packages many times,I am a student,Q5_10,0,Ordinal regression,NA
+R_6dZx0yvvpGqV1kw,I have used tidymodels packages many times,I am a student,Q5_12,0,Other,NA
+R_85AgRbS9j6Z7SaG,I have used tidymodels packages many times,I work in industry,Q5_1,0,Sparse tibbles,NA
+R_85AgRbS9j6Z7SaG,I have used tidymodels packages many times,I work in industry,Q5_2,0,Causal inference,NA
+R_85AgRbS9j6Z7SaG,I have used tidymodels packages many times,I work in industry,Q5_3,0,Improve chattr,NA
+R_85AgRbS9j6Z7SaG,I have used tidymodels packages many times,I work in industry,Q5_4,10,Cost-sensitive learning,NA
+R_85AgRbS9j6Z7SaG,I have used tidymodels packages many times,I work in industry,Q5_5,20,Stacking ensembles,NA
+R_85AgRbS9j6Z7SaG,I have used tidymodels packages many times,I work in industry,Q5_6,10,Spatial machine learning ,NA
+R_85AgRbS9j6Z7SaG,I have used tidymodels packages many times,I work in industry,Q5_10,60,Ordinal regression,NA
+R_85AgRbS9j6Z7SaG,I have used tidymodels packages many times,I work in industry,Q5_12,0,Other,NA
+R_2ZBK1jwg2JsWGnF,I have used tidymodels packages a few times,I work in industry,Q5_1,0,Sparse tibbles,NA
+R_2ZBK1jwg2JsWGnF,I have used tidymodels packages a few times,I work in industry,Q5_2,0,Causal inference,NA
+R_2ZBK1jwg2JsWGnF,I have used tidymodels packages a few times,I work in industry,Q5_3,0,Improve chattr,NA
+R_2ZBK1jwg2JsWGnF,I have used tidymodels packages a few times,I work in industry,Q5_4,0,Cost-sensitive learning,NA
+R_2ZBK1jwg2JsWGnF,I have used tidymodels packages a few times,I work in industry,Q5_5,0,Stacking ensembles,NA
+R_2ZBK1jwg2JsWGnF,I have used tidymodels packages a few times,I work in industry,Q5_6,100,Spatial machine learning ,NA
+R_2ZBK1jwg2JsWGnF,I have used tidymodels packages a few times,I work in industry,Q5_10,0,Ordinal regression,NA
+R_2ZBK1jwg2JsWGnF,I have used tidymodels packages a few times,I work in industry,Q5_12,0,Other,NA
+R_8oFtZbUPor9EDIZ,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_1,0,Sparse tibbles,NA
+R_8oFtZbUPor9EDIZ,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_2,40,Causal inference,NA
+R_8oFtZbUPor9EDIZ,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_3,0,Improve chattr,NA
+R_8oFtZbUPor9EDIZ,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_4,10,Cost-sensitive learning,NA
+R_8oFtZbUPor9EDIZ,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_5,0,Stacking ensembles,NA
+R_8oFtZbUPor9EDIZ,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_6,0,Spatial machine learning ,NA
+R_8oFtZbUPor9EDIZ,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_10,10,Ordinal regression,NA
+R_8oFtZbUPor9EDIZ,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_12,40,Other,Imputation
+R_4JBiSyxYcTuEyxX,I have used tidymodels packages a few times,I work in industry,Q5_1,0,Sparse tibbles,NA
+R_4JBiSyxYcTuEyxX,I have used tidymodels packages a few times,I work in industry,Q5_2,0,Causal inference,NA
+R_4JBiSyxYcTuEyxX,I have used tidymodels packages a few times,I work in industry,Q5_3,0,Improve chattr,NA
+R_4JBiSyxYcTuEyxX,I have used tidymodels packages a few times,I work in industry,Q5_4,0,Cost-sensitive learning,NA
+R_4JBiSyxYcTuEyxX,I have used tidymodels packages a few times,I work in industry,Q5_5,50,Stacking ensembles,NA
+R_4JBiSyxYcTuEyxX,I have used tidymodels packages a few times,I work in industry,Q5_6,50,Spatial machine learning ,NA
+R_4JBiSyxYcTuEyxX,I have used tidymodels packages a few times,I work in industry,Q5_10,0,Ordinal regression,NA
+R_4JBiSyxYcTuEyxX,I have used tidymodels packages a few times,I work in industry,Q5_12,0,Other,NA
+R_3zXTlOi813nm67j,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_1,0,Sparse tibbles,NA
+R_3zXTlOi813nm67j,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_2,90,Causal inference,NA
+R_3zXTlOi813nm67j,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_3,0,Improve chattr,NA
+R_3zXTlOi813nm67j,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_4,0,Cost-sensitive learning,NA
+R_3zXTlOi813nm67j,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_5,10,Stacking ensembles,NA
+R_3zXTlOi813nm67j,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_6,0,Spatial machine learning ,NA
+R_3zXTlOi813nm67j,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_10,0,Ordinal regression,NA
+R_3zXTlOi813nm67j,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_12,0,Other,NA
+R_7CTUyJp1WTVpeP7,I have used tidymodels packages many times,I work in industry,Q5_1,0,Sparse tibbles,NA
+R_7CTUyJp1WTVpeP7,I have used tidymodels packages many times,I work in industry,Q5_2,0,Causal inference,NA
+R_7CTUyJp1WTVpeP7,I have used tidymodels packages many times,I work in industry,Q5_3,0,Improve chattr,NA
+R_7CTUyJp1WTVpeP7,I have used tidymodels packages many times,I work in industry,Q5_4,0,Cost-sensitive learning,NA
+R_7CTUyJp1WTVpeP7,I have used tidymodels packages many times,I work in industry,Q5_5,0,Stacking ensembles,NA
+R_7CTUyJp1WTVpeP7,I have used tidymodels packages many times,I work in industry,Q5_6,0,Spatial machine learning ,NA
+R_7CTUyJp1WTVpeP7,I have used tidymodels packages many times,I work in industry,Q5_10,0,Ordinal regression,NA
+R_7CTUyJp1WTVpeP7,I have used tidymodels packages many times,I work in industry,Q5_12,100,Other,"I wish working with temporal data and forecasting models got as much attention, thoughts and support as a full-fledged member of tidymodels (from ergonomic design to vetiver)"
+R_3IXTTd2huRqMTm7,I have used tidymodels packages a few times,I work in industry,Q5_1,0,Sparse tibbles,NA
+R_3IXTTd2huRqMTm7,I have used tidymodels packages a few times,I work in industry,Q5_2,50,Causal inference,NA
+R_3IXTTd2huRqMTm7,I have used tidymodels packages a few times,I work in industry,Q5_3,0,Improve chattr,NA
+R_3IXTTd2huRqMTm7,I have used tidymodels packages a few times,I work in industry,Q5_4,0,Cost-sensitive learning,NA
+R_3IXTTd2huRqMTm7,I have used tidymodels packages a few times,I work in industry,Q5_5,0,Stacking ensembles,NA
+R_3IXTTd2huRqMTm7,I have used tidymodels packages a few times,I work in industry,Q5_6,0,Spatial machine learning ,NA
+R_3IXTTd2huRqMTm7,I have used tidymodels packages a few times,I work in industry,Q5_10,50,Ordinal regression,NA
+R_3IXTTd2huRqMTm7,I have used tidymodels packages a few times,I work in industry,Q5_12,0,Other,NA
+R_4JDZ8p6czdMzGra,I have used tidymodels packages many times,I work in industry,Q5_1,0,Sparse tibbles,NA
+R_4JDZ8p6czdMzGra,I have used tidymodels packages many times,I work in industry,Q5_2,0,Causal inference,NA
+R_4JDZ8p6czdMzGra,I have used tidymodels packages many times,I work in industry,Q5_3,0,Improve chattr,NA
+R_4JDZ8p6czdMzGra,I have used tidymodels packages many times,I work in industry,Q5_4,0,Cost-sensitive learning,NA
+R_4JDZ8p6czdMzGra,I have used tidymodels packages many times,I work in industry,Q5_5,50,Stacking ensembles,NA
+R_4JDZ8p6czdMzGra,I have used tidymodels packages many times,I work in industry,Q5_6,0,Spatial machine learning ,NA
+R_4JDZ8p6czdMzGra,I have used tidymodels packages many times,I work in industry,Q5_10,50,Ordinal regression,NA
+R_4JDZ8p6czdMzGra,I have used tidymodels packages many times,I work in industry,Q5_12,0,Other,NA
+R_1aKRlOPUCPLm60C,I have used tidymodels packages many times,I work in industry,Q5_1,10,Sparse tibbles,NA
+R_1aKRlOPUCPLm60C,I have used tidymodels packages many times,I work in industry,Q5_2,15,Causal inference,NA
+R_1aKRlOPUCPLm60C,I have used tidymodels packages many times,I work in industry,Q5_3,0,Improve chattr,NA
+R_1aKRlOPUCPLm60C,I have used tidymodels packages many times,I work in industry,Q5_4,0,Cost-sensitive learning,NA
+R_1aKRlOPUCPLm60C,I have used tidymodels packages many times,I work in industry,Q5_5,10,Stacking ensembles,NA
+R_1aKRlOPUCPLm60C,I have used tidymodels packages many times,I work in industry,Q5_6,40,Spatial machine learning ,NA
+R_1aKRlOPUCPLm60C,I have used tidymodels packages many times,I work in industry,Q5_10,25,Ordinal regression,NA
+R_1aKRlOPUCPLm60C,I have used tidymodels packages many times,I work in industry,Q5_12,0,Other,NA
+R_7gi2UbIUCSAbg6G,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_1,0,Sparse tibbles,NA
+R_7gi2UbIUCSAbg6G,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_2,75,Causal inference,NA
+R_7gi2UbIUCSAbg6G,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_3,0,Improve chattr,NA
+R_7gi2UbIUCSAbg6G,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_4,10,Cost-sensitive learning,NA
+R_7gi2UbIUCSAbg6G,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_5,15,Stacking ensembles,NA
+R_7gi2UbIUCSAbg6G,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_6,0,Spatial machine learning ,NA
+R_7gi2UbIUCSAbg6G,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_10,0,Ordinal regression,NA
+R_7gi2UbIUCSAbg6G,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_12,0,Other,NA
+R_7KVPRV0JmpVqEdr,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_1,0,Sparse tibbles,NA
+R_7KVPRV0JmpVqEdr,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_2,20,Causal inference,NA
+R_7KVPRV0JmpVqEdr,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_3,0,Improve chattr,NA
+R_7KVPRV0JmpVqEdr,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_4,0,Cost-sensitive learning,NA
+R_7KVPRV0JmpVqEdr,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_5,0,Stacking ensembles,NA
+R_7KVPRV0JmpVqEdr,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_6,0,Spatial machine learning ,NA
+R_7KVPRV0JmpVqEdr,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_10,80,Ordinal regression,NA
+R_7KVPRV0JmpVqEdr,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_12,0,Other,NA
+R_5G8L3YuuwC51CIF,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_1,0,Sparse tibbles,NA
+R_5G8L3YuuwC51CIF,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_2,0,Causal inference,NA
+R_5G8L3YuuwC51CIF,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_3,0,Improve chattr,NA
+R_5G8L3YuuwC51CIF,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_4,0,Cost-sensitive learning,NA
+R_5G8L3YuuwC51CIF,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_5,0,Stacking ensembles,NA
+R_5G8L3YuuwC51CIF,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_6,0,Spatial machine learning ,NA
+R_5G8L3YuuwC51CIF,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_10,100,Ordinal regression,NA
+R_5G8L3YuuwC51CIF,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_12,0,Other,NA
+R_27G0PTbv8RfUX29,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_1,0,Sparse tibbles,NA
+R_27G0PTbv8RfUX29,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_2,50,Causal inference,NA
+R_27G0PTbv8RfUX29,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_3,0,Improve chattr,NA
+R_27G0PTbv8RfUX29,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_4,0,Cost-sensitive learning,NA
+R_27G0PTbv8RfUX29,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_5,0,Stacking ensembles,NA
+R_27G0PTbv8RfUX29,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_6,0,Spatial machine learning ,NA
+R_27G0PTbv8RfUX29,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_10,50,Ordinal regression,NA
+R_27G0PTbv8RfUX29,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_12,0,Other,NA
+R_20y32IKN4gVNlDP,I have used tidymodels packages many times,I am a student,Q5_1,0,Sparse tibbles,NA
+R_20y32IKN4gVNlDP,I have used tidymodels packages many times,I am a student,Q5_2,0,Causal inference,NA
+R_20y32IKN4gVNlDP,I have used tidymodels packages many times,I am a student,Q5_3,0,Improve chattr,NA
+R_20y32IKN4gVNlDP,I have used tidymodels packages many times,I am a student,Q5_4,0,Cost-sensitive learning,NA
+R_20y32IKN4gVNlDP,I have used tidymodels packages many times,I am a student,Q5_5,0,Stacking ensembles,NA
+R_20y32IKN4gVNlDP,I have used tidymodels packages many times,I am a student,Q5_6,0,Spatial machine learning ,NA
+R_20y32IKN4gVNlDP,I have used tidymodels packages many times,I am a student,Q5_10,100,Ordinal regression,NA
+R_20y32IKN4gVNlDP,I have used tidymodels packages many times,I am a student,Q5_12,0,Other,NA
+R_8c72IhcnaCl3YhN,I have contributed to tidymodels packages or taught others how to use them,"I am an academic, professor, and/or researcher",Q5_1,100,Sparse tibbles,NA
+R_8c72IhcnaCl3YhN,I have contributed to tidymodels packages or taught others how to use them,"I am an academic, professor, and/or researcher",Q5_2,0,Causal inference,NA
+R_8c72IhcnaCl3YhN,I have contributed to tidymodels packages or taught others how to use them,"I am an academic, professor, and/or researcher",Q5_3,0,Improve chattr,NA
+R_8c72IhcnaCl3YhN,I have contributed to tidymodels packages or taught others how to use them,"I am an academic, professor, and/or researcher",Q5_4,0,Cost-sensitive learning,NA
+R_8c72IhcnaCl3YhN,I have contributed to tidymodels packages or taught others how to use them,"I am an academic, professor, and/or researcher",Q5_5,0,Stacking ensembles,NA
+R_8c72IhcnaCl3YhN,I have contributed to tidymodels packages or taught others how to use them,"I am an academic, professor, and/or researcher",Q5_6,0,Spatial machine learning ,NA
+R_8c72IhcnaCl3YhN,I have contributed to tidymodels packages or taught others how to use them,"I am an academic, professor, and/or researcher",Q5_10,0,Ordinal regression,NA
+R_8c72IhcnaCl3YhN,I have contributed to tidymodels packages or taught others how to use them,"I am an academic, professor, and/or researcher",Q5_12,0,Other,NA
+R_3oe2WeJ5S5zDjMZ,I have used tidymodels packages many times,I am a hobbyist,Q5_1,0,Sparse tibbles,NA
+R_3oe2WeJ5S5zDjMZ,I have used tidymodels packages many times,I am a hobbyist,Q5_2,30,Causal inference,NA
+R_3oe2WeJ5S5zDjMZ,I have used tidymodels packages many times,I am a hobbyist,Q5_3,0,Improve chattr,NA
+R_3oe2WeJ5S5zDjMZ,I have used tidymodels packages many times,I am a hobbyist,Q5_4,0,Cost-sensitive learning,NA
+R_3oe2WeJ5S5zDjMZ,I have used tidymodels packages many times,I am a hobbyist,Q5_5,20,Stacking ensembles,NA
+R_3oe2WeJ5S5zDjMZ,I have used tidymodels packages many times,I am a hobbyist,Q5_6,0,Spatial machine learning ,NA
+R_3oe2WeJ5S5zDjMZ,I have used tidymodels packages many times,I am a hobbyist,Q5_10,50,Ordinal regression,NA
+R_3oe2WeJ5S5zDjMZ,I have used tidymodels packages many times,I am a hobbyist,Q5_12,0,Other,NA
+R_2Rf8h7uG9b036VP,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_1,0,Sparse tibbles,NA
+R_2Rf8h7uG9b036VP,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_2,100,Causal inference,NA
+R_2Rf8h7uG9b036VP,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_3,0,Improve chattr,NA
+R_2Rf8h7uG9b036VP,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_4,0,Cost-sensitive learning,NA
+R_2Rf8h7uG9b036VP,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_5,0,Stacking ensembles,NA
+R_2Rf8h7uG9b036VP,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_6,0,Spatial machine learning ,NA
+R_2Rf8h7uG9b036VP,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_10,0,Ordinal regression,NA
+R_2Rf8h7uG9b036VP,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_12,0,Other,NA
+R_2gIw9JCD5ZWxwO8,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_1,0,Sparse tibbles,NA
+R_2gIw9JCD5ZWxwO8,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_2,45,Causal inference,NA
+R_2gIw9JCD5ZWxwO8,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_3,0,Improve chattr,NA
+R_2gIw9JCD5ZWxwO8,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_4,0,Cost-sensitive learning,NA
+R_2gIw9JCD5ZWxwO8,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_5,0,Stacking ensembles,NA
+R_2gIw9JCD5ZWxwO8,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_6,0,Spatial machine learning ,NA
+R_2gIw9JCD5ZWxwO8,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_10,25,Ordinal regression,NA
+R_2gIw9JCD5ZWxwO8,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_12,30,Other,post-processing steps in workflows
+R_1jbA9JLx6uhSTRL,I have used tidymodels packages many times,I work in industry,Q5_1,0,Sparse tibbles,NA
+R_1jbA9JLx6uhSTRL,I have used tidymodels packages many times,I work in industry,Q5_2,100,Causal inference,NA
+R_1jbA9JLx6uhSTRL,I have used tidymodels packages many times,I work in industry,Q5_3,0,Improve chattr,NA
+R_1jbA9JLx6uhSTRL,I have used tidymodels packages many times,I work in industry,Q5_4,0,Cost-sensitive learning,NA
+R_1jbA9JLx6uhSTRL,I have used tidymodels packages many times,I work in industry,Q5_5,0,Stacking ensembles,NA
+R_1jbA9JLx6uhSTRL,I have used tidymodels packages many times,I work in industry,Q5_6,0,Spatial machine learning ,NA
+R_1jbA9JLx6uhSTRL,I have used tidymodels packages many times,I work in industry,Q5_10,0,Ordinal regression,NA
+R_1jbA9JLx6uhSTRL,I have used tidymodels packages many times,I work in industry,Q5_12,0,Other,NA
+R_3OGRyTVzwCCnrdw,I have used tidymodels packages a few times,I work in industry,Q5_1,0,Sparse tibbles,NA
+R_3OGRyTVzwCCnrdw,I have used tidymodels packages a few times,I work in industry,Q5_2,10,Causal inference,NA
+R_3OGRyTVzwCCnrdw,I have used tidymodels packages a few times,I work in industry,Q5_3,0,Improve chattr,NA
+R_3OGRyTVzwCCnrdw,I have used tidymodels packages a few times,I work in industry,Q5_4,10,Cost-sensitive learning,NA
+R_3OGRyTVzwCCnrdw,I have used tidymodels packages a few times,I work in industry,Q5_5,50,Stacking ensembles,NA
+R_3OGRyTVzwCCnrdw,I have used tidymodels packages a few times,I work in industry,Q5_6,10,Spatial machine learning ,NA
+R_3OGRyTVzwCCnrdw,I have used tidymodels packages a few times,I work in industry,Q5_10,20,Ordinal regression,NA
+R_3OGRyTVzwCCnrdw,I have used tidymodels packages a few times,I work in industry,Q5_12,0,Other,NA
+R_7iy45GXQyCJawA9,I have used tidymodels packages a few times,I work in industry,Q5_1,19,Sparse tibbles,NA
+R_7iy45GXQyCJawA9,I have used tidymodels packages a few times,I work in industry,Q5_2,42,Causal inference,NA
+R_7iy45GXQyCJawA9,I have used tidymodels packages a few times,I work in industry,Q5_3,31,Improve chattr,NA
+R_7iy45GXQyCJawA9,I have used tidymodels packages a few times,I work in industry,Q5_4,2,Cost-sensitive learning,NA
+R_7iy45GXQyCJawA9,I have used tidymodels packages a few times,I work in industry,Q5_5,2,Stacking ensembles,NA
+R_7iy45GXQyCJawA9,I have used tidymodels packages a few times,I work in industry,Q5_6,2,Spatial machine learning ,NA
+R_7iy45GXQyCJawA9,I have used tidymodels packages a few times,I work in industry,Q5_10,2,Ordinal regression,NA
+R_7iy45GXQyCJawA9,I have used tidymodels packages a few times,I work in industry,Q5_12,0,Other,NA
+R_4g1m7bthRBUdCCv,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_1,50,Sparse tibbles,NA
+R_4g1m7bthRBUdCCv,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_2,10,Causal inference,NA
+R_4g1m7bthRBUdCCv,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_3,0,Improve chattr,NA
+R_4g1m7bthRBUdCCv,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_4,0,Cost-sensitive learning,NA
+R_4g1m7bthRBUdCCv,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_5,30,Stacking ensembles,NA
+R_4g1m7bthRBUdCCv,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_6,10,Spatial machine learning ,NA
+R_4g1m7bthRBUdCCv,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_10,0,Ordinal regression,NA
+R_4g1m7bthRBUdCCv,I have used tidymodels packages a few times,"I am an academic, professor, and/or researcher",Q5_12,0,Other,NA
+R_6ZWTCOSn6D6kaRb,I have used tidymodels packages many times,I work in industry,Q5_1,0,Sparse tibbles,NA
+R_6ZWTCOSn6D6kaRb,I have used tidymodels packages many times,I work in industry,Q5_2,50,Causal inference,NA
+R_6ZWTCOSn6D6kaRb,I have used tidymodels packages many times,I work in industry,Q5_3,0,Improve chattr,NA
+R_6ZWTCOSn6D6kaRb,I have used tidymodels packages many times,I work in industry,Q5_4,0,Cost-sensitive learning,NA
+R_6ZWTCOSn6D6kaRb,I have used tidymodels packages many times,I work in industry,Q5_5,0,Stacking ensembles,NA
+R_6ZWTCOSn6D6kaRb,I have used tidymodels packages many times,I work in industry,Q5_6,0,Spatial machine learning ,NA
+R_6ZWTCOSn6D6kaRb,I have used tidymodels packages many times,I work in industry,Q5_10,50,Ordinal regression,NA
+R_6ZWTCOSn6D6kaRb,I have used tidymodels packages many times,I work in industry,Q5_12,0,Other,NA
+R_7B3btwas1QqUlDr,I have used tidymodels packages many times,I work in industry,Q5_1,0,Sparse tibbles,NA
+R_7B3btwas1QqUlDr,I have used tidymodels packages many times,I work in industry,Q5_2,0,Causal inference,NA
+R_7B3btwas1QqUlDr,I have used tidymodels packages many times,I work in industry,Q5_3,0,Improve chattr,NA
+R_7B3btwas1QqUlDr,I have used tidymodels packages many times,I work in industry,Q5_4,0,Cost-sensitive learning,NA
+R_7B3btwas1QqUlDr,I have used tidymodels packages many times,I work in industry,Q5_5,100,Stacking ensembles,NA
+R_7B3btwas1QqUlDr,I have used tidymodels packages many times,I work in industry,Q5_6,0,Spatial machine learning ,NA
+R_7B3btwas1QqUlDr,I have used tidymodels packages many times,I work in industry,Q5_10,0,Ordinal regression,NA
+R_7B3btwas1QqUlDr,I have used tidymodels packages many times,I work in industry,Q5_12,0,Other,NA
+R_1JTBU8v0Y5Cxy9j,I have used tidymodels packages a few times,I work in industry,Q5_1,85,Sparse tibbles,NA
+R_1JTBU8v0Y5Cxy9j,I have used tidymodels packages a few times,I work in industry,Q5_2,0,Causal inference,NA
+R_1JTBU8v0Y5Cxy9j,I have used tidymodels packages a few times,I work in industry,Q5_3,5,Improve chattr,NA
+R_1JTBU8v0Y5Cxy9j,I have used tidymodels packages a few times,I work in industry,Q5_4,0,Cost-sensitive learning,NA
+R_1JTBU8v0Y5Cxy9j,I have used tidymodels packages a few times,I work in industry,Q5_5,5,Stacking ensembles,NA
+R_1JTBU8v0Y5Cxy9j,I have used tidymodels packages a few times,I work in industry,Q5_6,0,Spatial machine learning ,NA
+R_1JTBU8v0Y5Cxy9j,I have used tidymodels packages a few times,I work in industry,Q5_10,5,Ordinal regression,NA
+R_1JTBU8v0Y5Cxy9j,I have used tidymodels packages a few times,I work in industry,Q5_12,0,Other,NA
+R_2rlGgU15yG2or6X,I have used tidymodels packages many times,I work in industry,Q5_1,20,Sparse tibbles,NA
+R_2rlGgU15yG2or6X,I have used tidymodels packages many times,I work in industry,Q5_2,15,Causal inference,NA
+R_2rlGgU15yG2or6X,I have used tidymodels packages many times,I work in industry,Q5_3,0,Improve chattr,NA
+R_2rlGgU15yG2or6X,I have used tidymodels packages many times,I work in industry,Q5_4,0,Cost-sensitive learning,NA
+R_2rlGgU15yG2or6X,I have used tidymodels packages many times,I work in industry,Q5_5,0,Stacking ensembles,NA
+R_2rlGgU15yG2or6X,I have used tidymodels packages many times,I work in industry,Q5_6,0,Spatial machine learning ,NA
+R_2rlGgU15yG2or6X,I have used tidymodels packages many times,I work in industry,Q5_10,15,Ordinal regression,NA
+R_2rlGgU15yG2or6X,I have used tidymodels packages many times,I work in industry,Q5_12,50,Other,Hyperparameter tuning with nested CV resampling
+R_4CCkP5cbjG5aJ4A,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_1,25,Sparse tibbles,NA
+R_4CCkP5cbjG5aJ4A,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_2,25,Causal inference,NA
+R_4CCkP5cbjG5aJ4A,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_3,0,Improve chattr,NA
+R_4CCkP5cbjG5aJ4A,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_4,0,Cost-sensitive learning,NA
+R_4CCkP5cbjG5aJ4A,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_5,0,Stacking ensembles,NA
+R_4CCkP5cbjG5aJ4A,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_6,50,Spatial machine learning ,NA
+R_4CCkP5cbjG5aJ4A,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_10,0,Ordinal regression,NA
+R_4CCkP5cbjG5aJ4A,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_12,0,Other,NA
+R_4R4RnflgqBknw8G,I have used tidymodels packages many times,I work in industry,Q5_1,100,Sparse tibbles,NA
+R_4R4RnflgqBknw8G,I have used tidymodels packages many times,I work in industry,Q5_2,0,Causal inference,NA
+R_4R4RnflgqBknw8G,I have used tidymodels packages many times,I work in industry,Q5_3,0,Improve chattr,NA
+R_4R4RnflgqBknw8G,I have used tidymodels packages many times,I work in industry,Q5_4,0,Cost-sensitive learning,NA
+R_4R4RnflgqBknw8G,I have used tidymodels packages many times,I work in industry,Q5_5,0,Stacking ensembles,NA
+R_4R4RnflgqBknw8G,I have used tidymodels packages many times,I work in industry,Q5_6,0,Spatial machine learning ,NA
+R_4R4RnflgqBknw8G,I have used tidymodels packages many times,I work in industry,Q5_10,0,Ordinal regression,NA
+R_4R4RnflgqBknw8G,I have used tidymodels packages many times,I work in industry,Q5_12,0,Other,NA
+R_1Kx3JC5yHimEH14,I have used tidymodels packages many times,I work in industry,Q5_1,5,Sparse tibbles,NA
+R_1Kx3JC5yHimEH14,I have used tidymodels packages many times,I work in industry,Q5_2,10,Causal inference,NA
+R_1Kx3JC5yHimEH14,I have used tidymodels packages many times,I work in industry,Q5_3,5,Improve chattr,NA
+R_1Kx3JC5yHimEH14,I have used tidymodels packages many times,I work in industry,Q5_4,10,Cost-sensitive learning,NA
+R_1Kx3JC5yHimEH14,I have used tidymodels packages many times,I work in industry,Q5_5,20,Stacking ensembles,NA
+R_1Kx3JC5yHimEH14,I have used tidymodels packages many times,I work in industry,Q5_6,10,Spatial machine learning ,NA
+R_1Kx3JC5yHimEH14,I have used tidymodels packages many times,I work in industry,Q5_10,20,Ordinal regression,NA
+R_1Kx3JC5yHimEH14,I have used tidymodels packages many times,I work in industry,Q5_12,20,Other,More Multivariate methods
+R_4Yxs8hjKUhUtkYN,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_1,10,Sparse tibbles,NA
+R_4Yxs8hjKUhUtkYN,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_2,25,Causal inference,NA
+R_4Yxs8hjKUhUtkYN,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_3,0,Improve chattr,NA
+R_4Yxs8hjKUhUtkYN,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_4,0,Cost-sensitive learning,NA
+R_4Yxs8hjKUhUtkYN,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_5,0,Stacking ensembles,NA
+R_4Yxs8hjKUhUtkYN,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_6,10,Spatial machine learning ,NA
+R_4Yxs8hjKUhUtkYN,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_10,20,Ordinal regression,NA
+R_4Yxs8hjKUhUtkYN,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_12,35,Other,deep learning models for image classification
+R_1Pk1oDgLlGUejuY,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_1,5,Sparse tibbles,NA
+R_1Pk1oDgLlGUejuY,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_2,30,Causal inference,NA
+R_1Pk1oDgLlGUejuY,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_3,5,Improve chattr,NA
+R_1Pk1oDgLlGUejuY,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_4,10,Cost-sensitive learning,NA
+R_1Pk1oDgLlGUejuY,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_5,5,Stacking ensembles,NA
+R_1Pk1oDgLlGUejuY,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_6,40,Spatial machine learning ,NA
+R_1Pk1oDgLlGUejuY,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_10,5,Ordinal regression,NA
+R_1Pk1oDgLlGUejuY,I have used tidymodels packages many times,"I am an academic, professor, and/or researcher",Q5_12,0,Other,NA
+R_1rgSwDklmSs8Ogp,I have used tidymodels packages a few times,I am a hobbyist,Q5_1,40,Sparse tibbles,NA
+R_1rgSwDklmSs8Ogp,I have used tidymodels packages a few times,I am a hobbyist,Q5_2,40,Causal inference,NA
+R_1rgSwDklmSs8Ogp,I have used tidymodels packages a few times,I am a hobbyist,Q5_3,0,Improve chattr,NA
+R_1rgSwDklmSs8Ogp,I have used tidymodels packages a few times,I am a hobbyist,Q5_4,0,Cost-sensitive learning,NA
+R_1rgSwDklmSs8Ogp,I have used tidymodels packages a few times,I am a hobbyist,Q5_5,0,Stacking ensembles,NA
+R_1rgSwDklmSs8Ogp,I have used tidymodels packages a few times,I am a hobbyist,Q5_6,20,Spatial machine learning ,NA
+R_1rgSwDklmSs8Ogp,I have used tidymodels packages a few times,I am a hobbyist,Q5_10,0,Ordinal regression,NA
+R_1rgSwDklmSs8Ogp,I have used tidymodels packages a few times,I am a hobbyist,Q5_12,0,Other,NA
+R_4CDFOtdYWBLGxBo,I have used tidymodels packages a few times,I work in industry,Q5_1,10,Sparse tibbles,NA
+R_4CDFOtdYWBLGxBo,I have used tidymodels packages a few times,I work in industry,Q5_2,5,Causal inference,NA
+R_4CDFOtdYWBLGxBo,I have used tidymodels packages a few times,I work in industry,Q5_3,0,Improve chattr,NA
+R_4CDFOtdYWBLGxBo,I have used tidymodels packages a few times,I work in industry,Q5_4,10,Cost-sensitive learning,NA
+R_4CDFOtdYWBLGxBo,I have used tidymodels packages a few times,I work in industry,Q5_5,25,Stacking ensembles,NA
+R_4CDFOtdYWBLGxBo,I have used tidymodels packages a few times,I work in industry,Q5_6,25,Spatial machine learning ,NA
+R_4CDFOtdYWBLGxBo,I have used tidymodels packages a few times,I work in industry,Q5_10,25,Ordinal regression,NA
+R_4CDFOtdYWBLGxBo,I have used tidymodels packages a few times,I work in industry,Q5_12,0,Other,NA
+R_18CfeUaerdPT42f,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_1,25,Sparse tibbles,NA
+R_18CfeUaerdPT42f,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_2,0,Causal inference,NA
+R_18CfeUaerdPT42f,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_3,0,Improve chattr,NA
+R_18CfeUaerdPT42f,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_4,0,Cost-sensitive learning,NA
+R_18CfeUaerdPT42f,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_5,0,Stacking ensembles,NA
+R_18CfeUaerdPT42f,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_6,0,Spatial machine learning ,NA
+R_18CfeUaerdPT42f,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_10,75,Ordinal regression,NA
+R_18CfeUaerdPT42f,I have contributed to tidymodels packages or taught others how to use them,I work in industry,Q5_12,0,Other,NA
+R_57WLt1wv0gzxGXK,I have never used tidymodels,"I am an academic, professor, and/or researcher",Q5_1,0,Sparse tibbles,NA
+R_57WLt1wv0gzxGXK,I have never used tidymodels,"I am an academic, professor, and/or researcher",Q5_2,20,Causal inference,NA
+R_57WLt1wv0gzxGXK,I have never used tidymodels,"I am an academic, professor, and/or researcher",Q5_3,0,Improve chattr,NA
+R_57WLt1wv0gzxGXK,I have never used tidymodels,"I am an academic, professor, and/or researcher",Q5_4,20,Cost-sensitive learning,NA
+R_57WLt1wv0gzxGXK,I have never used tidymodels,"I am an academic, professor, and/or researcher",Q5_5,0,Stacking ensembles,NA
+R_57WLt1wv0gzxGXK,I have never used tidymodels,"I am an academic, professor, and/or researcher",Q5_6,0,Spatial machine learning ,NA
+R_57WLt1wv0gzxGXK,I have never used tidymodels,"I am an academic, professor, and/or researcher",Q5_10,20,Ordinal regression,NA
+R_57WLt1wv0gzxGXK,I have never used tidymodels,"I am an academic, professor, and/or researcher",Q5_12,40,Other,Latent variable/structural equation modeling
+R_2geFz0pnWy8EOEu,I have never used tidymodels,I work in industry,Q5_1,10,Sparse tibbles,NA
+R_2geFz0pnWy8EOEu,I have never used tidymodels,I work in industry,Q5_2,60,Causal inference,NA
+R_2geFz0pnWy8EOEu,I have never used tidymodels,I work in industry,Q5_3,0,Improve chattr,NA
+R_2geFz0pnWy8EOEu,I have never used tidymodels,I work in industry,Q5_4,0,Cost-sensitive learning,NA
+R_2geFz0pnWy8EOEu,I have never used tidymodels,I work in industry,Q5_5,0,Stacking ensembles,NA
+R_2geFz0pnWy8EOEu,I have never used tidymodels,I work in industry,Q5_6,0,Spatial machine learning ,NA
+R_2geFz0pnWy8EOEu,I have never used tidymodels,I work in industry,Q5_10,10,Ordinal regression,NA
+R_2geFz0pnWy8EOEu,I have never used tidymodels,I work in industry,Q5_12,20,Other,Spark Pipeline Support
+R_3jV5peI9IylIRGb,I have used tidymodels packages many times,I am a student,Q5_1,0,Sparse tibbles,NA
+R_3jV5peI9IylIRGb,I have used tidymodels packages many times,I am a student,Q5_2,40,Causal inference,NA
+R_3jV5peI9IylIRGb,I have used tidymodels packages many times,I am a student,Q5_3,10,Improve chattr,NA
+R_3jV5peI9IylIRGb,I have used tidymodels packages many times,I am a student,Q5_4,20,Cost-sensitive learning,NA
+R_3jV5peI9IylIRGb,I have used tidymodels packages many times,I am a student,Q5_5,0,Stacking ensembles,NA
+R_3jV5peI9IylIRGb,I have used tidymodels packages many times,I am a student,Q5_6,0,Spatial machine learning ,NA
+R_3jV5peI9IylIRGb,I have used tidymodels packages many times,I am a student,Q5_10,30,Ordinal regression,NA
+R_3jV5peI9IylIRGb,I have used tidymodels packages many times,I am a student,Q5_12,0,Other,NA
+R_21sms0UtSc792bI,I have used tidymodels packages a few times,I work in industry,Q5_1,0,Sparse tibbles,NA
+R_21sms0UtSc792bI,I have used tidymodels packages a few times,I work in industry,Q5_2,20,Causal inference,NA
+R_21sms0UtSc792bI,I have used tidymodels packages a few times,I work in industry,Q5_3,0,Improve chattr,NA
+R_21sms0UtSc792bI,I have used tidymodels packages a few times,I work in industry,Q5_4,0,Cost-sensitive learning,NA
+R_21sms0UtSc792bI,I have used tidymodels packages a few times,I work in industry,Q5_5,0,Stacking ensembles,NA
+R_21sms0UtSc792bI,I have used tidymodels packages a few times,I work in industry,Q5_6,10,Spatial machine learning ,NA
+R_21sms0UtSc792bI,I have used tidymodels packages a few times,I work in industry,Q5_10,70,Ordinal regression,NA
+R_21sms0UtSc792bI,I have used tidymodels packages a few times,I work in industry,Q5_12,0,Other,NA
+R_3QtfASUd5zLlZDl,I have used tidymodels packages a few times,I work in industry,Q5_1,20,Sparse tibbles,NA
+R_3QtfASUd5zLlZDl,I have used tidymodels packages a few times,I work in industry,Q5_2,20,Causal inference,NA
+R_3QtfASUd5zLlZDl,I have used tidymodels packages a few times,I work in industry,Q5_3,0,Improve chattr,NA
+R_3QtfASUd5zLlZDl,I have used tidymodels packages a few times,I work in industry,Q5_4,10,Cost-sensitive learning,NA
+R_3QtfASUd5zLlZDl,I have used tidymodels packages a few times,I work in industry,Q5_5,25,Stacking ensembles,NA
+R_3QtfASUd5zLlZDl,I have used tidymodels packages a few times,I work in industry,Q5_6,25,Spatial machine learning ,NA
+R_3QtfASUd5zLlZDl,I have used tidymodels packages a few times,I work in industry,Q5_10,0,Ordinal regression,NA
+R_3QtfASUd5zLlZDl,I have used tidymodels packages a few times,I work in industry,Q5_12,0,Other,NA
+R_3nUCHIokplCXAqD,I have used tidymodels packages a few times,I work in industry,Q5_1,0,Sparse tibbles,NA
+R_3nUCHIokplCXAqD,I have used tidymodels packages a few times,I work in industry,Q5_2,0,Causal inference,NA
+R_3nUCHIokplCXAqD,I have used tidymodels packages a few times,I work in industry,Q5_3,0,Improve chattr,NA
+R_3nUCHIokplCXAqD,I have used tidymodels packages a few times,I work in industry,Q5_4,30,Cost-sensitive learning,NA
+R_3nUCHIokplCXAqD,I have used tidymodels packages a few times,I work in industry,Q5_5,50,Stacking ensembles,NA
+R_3nUCHIokplCXAqD,I have used tidymodels packages a few times,I work in industry,Q5_6,0,Spatial machine learning ,NA
+R_3nUCHIokplCXAqD,I have used tidymodels packages a few times,I work in industry,Q5_10,20,Ordinal regression,NA
+R_3nUCHIokplCXAqD,I have used tidymodels packages a few times,I work in industry,Q5_12,0,Other,NA
+R_4ko4JR0jddvoNuF,I have used tidymodels packages a few times,I work in industry,Q5_1,0,Sparse tibbles,NA
+R_4ko4JR0jddvoNuF,I have used tidymodels packages a few times,I work in industry,Q5_2,40,Causal inference,NA
+R_4ko4JR0jddvoNuF,I have used tidymodels packages a few times,I work in industry,Q5_3,0,Improve chattr,NA
+R_4ko4JR0jddvoNuF,I have used tidymodels packages a few times,I work in industry,Q5_4,0,Cost-sensitive learning,NA
+R_4ko4JR0jddvoNuF,I have used tidymodels packages a few times,I work in industry,Q5_5,0,Stacking ensembles,NA
+R_4ko4JR0jddvoNuF,I have used tidymodels packages a few times,I work in industry,Q5_6,0,Spatial machine learning ,NA
+R_4ko4JR0jddvoNuF,I have used tidymodels packages a few times,I work in industry,Q5_10,0,Ordinal regression,NA
+R_4ko4JR0jddvoNuF,I have used tidymodels packages a few times,I work in industry,Q5_12,60,Other,Sequential Experimental design (suggesting the parameters for the next experiment based on bayesian regression)