Spring 2024 All Workshops Survey Responses

Number of responses

Code
library(tidyverse)
library(bslib)
library(shiny)
library(bsicons)
source("scripts/helper_functions.R")

# list of workshop IDs to filter results
workshops <- c("2024-06-10-ucsb-geospatial", "2024-06-04-ucsb-containers", "2024-05-01-ucsb-r")

results <- read_csv("data-joined/all_workshops.csv") %>% 
  filter(workshop %in% workshops)

pre_survey <- results %>%
  select(ends_with(".pre"))

post_survey <- results %>%
  select(ends_with(".post"))

n_pre <- sum(apply(post_survey, 1, function(row) all(is.na(row))))
n_post <- sum(apply(pre_survey, 1, function(row) all(is.na(row))))
n_total <- nrow(results)
n_both <- nrow(results) - n_pre - n_post

layout_columns(
  value_box(
    title = "Total responses", value = n_total, ,
    theme = NULL, showcase = bs_icon("people-fill"), showcase_layout = "left center",
    full_screen = FALSE, fill = TRUE, height = NULL
  ),
  value_box(
    title = "Both pre- and post-", value = n_both, , theme = NULL,
    showcase = bs_icon("arrows-expand-vertical"), showcase_layout = "left center",
    full_screen = FALSE, fill = TRUE, height = NULL
  ),
  value_box(
    title = "Only pre-workshop", value = n_pre, ,
    theme = NULL, showcase = bs_icon("arrow-left-short"), showcase_layout = "left center",
    full_screen = FALSE, fill = TRUE, height = NULL
  ),
  value_box(
    title = "Only post-workshop", value = n_post, , theme = NULL,
    showcase = bs_icon("arrow-right-short"), showcase_layout = "left center",
    full_screen = FALSE, fill = TRUE, height = NULL
  )
)

Total responses

49

Both pre- and post-

15

Only pre-workshop

25

Only post-workshop

9

Departments

Code
depts <- results %>% select(dept_select.pre) %>% 
  separate_rows(dept_select.pre, sep=",") %>% 
  count(dept_select.pre, name = "count") %>% 
  mutate(percent = (count / (n_total - n_post)) * 100,
         text = sprintf("%.0f (%.0f%%)", count, percent))

ggplot(depts, aes(y=reorder(dept_select.pre, count), x=count)) +
    geom_col() +
    geom_label(aes(label = text, hjust = -0.1),
               size = 3) +
    labs(x = "# respondents", y = element_blank()) +  
    theme_minimal() +
    theme(
      panel.grid.minor = element_blank(),
      panel.grid.major.y = element_blank()
      ) +
    expand_limits(x = c(0,max(depts$count)*1.1))

“Other” Departments

Code
other_depts <- results %>% 
  count(dept_other.pre, name = "count") %>% 
  drop_na() %>% 
  mutate(percent = (count / (n_total - n_post)) * 100,
         text = sprintf("%.0f (%.0f%%)", count, percent))

ggplot(other_depts, aes(y=reorder(dept_other.pre, count), x=count)) +
    geom_col() +
    geom_label(aes(label = text, hjust = -0.1),
               size = 3) +
    labs(x = "# respondents", y = element_blank()) + 
    theme_minimal() +
    theme(
      panel.grid.minor = element_blank(),
      panel.grid.major.y = element_blank()
      ) +
    expand_limits(x = c(0,max(other_depts$count)*1.1))

Current occupation / Career stage

Code
ocup <- results %>% select(occupation.pre) %>% 
  separate_rows(occupation.pre, sep=",") %>% 
  count(occupation.pre, name = "count") %>% 
  drop_na() %>% 
  mutate(percent = (count / (n_total - n_post)) * 100,
         text = sprintf("%.0f (%.0f%%)", count, percent))

ggplot(ocup, aes(y=reorder(occupation.pre, count), x=count)) +
    geom_col() +
    geom_label(aes(label = text, hjust = -0.1),
               size = 3) +
    labs(x = "# respondents", y = element_blank()) + 
    theme_minimal() +
    theme(
      panel.grid.minor = element_blank(),
      panel.grid.major.y = element_blank()
      ) +
    expand_limits(x = c(0,max(ocup$count)*1.2))

Motivation - Why are you participating in this workshop?

Code
motiv <- results %>% select(motivation_select.pre) %>% 
  separate_rows(motivation_select.pre, sep=",")  %>% 
  count(motivation_select.pre, name = "count") %>% 
  drop_na() %>% 
  mutate(percent = (count / (n_total - n_post)) * 100,
         text = sprintf("%.0f (%.0f%%)", count, percent))

ggplot(motiv, aes(y=reorder(motivation_select.pre, count), x=count)) +
    geom_col() +
    geom_label(aes(label = text, hjust = -0.1),
               size = 3) +
    labs(x = "# respondents", y = element_blank()) + 
    theme_minimal() +
    theme(
      panel.grid.minor = element_blank(),
      panel.grid.major.y = element_blank()
      ) +
    expand_limits(x = c(0,max(motiv$count)*1.2))

How did you find out about this workshop?

Code
findw <- results %>% select(findout_select.pre) %>% 
  separate_rows(findout_select.pre, sep=",")  %>% 
  count(findout_select.pre, name = "count") %>% 
  drop_na() %>% 
  mutate(percent = (count / (n_total - n_post)) * 100,
         text = sprintf("%.0f (%.0f%%)", count, percent))

ggplot(findw, aes(y=reorder(findout_select.pre, count), x=count)) +
    geom_col() +
    geom_label(aes(label = text, hjust = -0.1),
               size = 3) +
    labs(x = "# respondents", y = element_blank()) + 
    theme_minimal() +
    theme(
      panel.grid.minor = element_blank(),
      panel.grid.major.y = element_blank()
      ) +
    expand_limits(x = c(0,max(findw$count)*1.2))

What you most hope to learn?

Code
results %>% group_by(workshop) %>% 
  select(workshop, hopes.pre) %>% 
  drop_na()
workshop hopes.pre
2024-05-01-ucsb-r How to better organize my data analysis workflow and better understand specific functions/arguments;
2024-05-01-ucsb-r I just want to be able to feel more confident in using R and coding from scratch. I find that reviewing the basics and solidifying them in a learning environment is extremely helpful.
2024-05-01-ucsb-r Coding in R, graphing data, comparing multiple sets of data at once, generate graphs
2024-05-01-ucsb-r R from the beginning
2024-05-01-ucsb-r I want to be able to explain R basics to another student. I also want to be able to analyze my own data from research projects.
2024-05-01-ucsb-r a basic understanding of using R
2024-05-01-ucsb-r Generally, I hope to become more familiar with R! I would like the space to practice using it and ask questions :)
2024-05-01-ucsb-r Broad introduction to R, in a way that I feel comfortable writing functions, processing data and doing some regressions.
2024-05-01-ucsb-r Making visuals (figures) that are better than SAS
2024-05-01-ucsb-r I want to learn the basics of R because it is very relevant to statistical analysis and jobs in environmental science and geography.
2024-05-01-ucsb-r I hope to learn how to take raw data and clean null values, organize it by a selected time period, compute averages by a selected time period, and learn how to plot results (x=time, y=variable value). I would also love to learn how to do statistical analyses if possible, such as Principal component analysis or plotting a linear regression.
2024-05-01-ucsb-r R for social sciences
2024-05-01-ucsb-r to learn the basics:)
2024-05-01-ucsb-r i will review my knowledge about R studio
2024-06-04-ucsb-containers Context for assisting researchers from an IT system administrator perspective.
2024-06-04-ucsb-containers Learning to develop and use a container for reproducible data management and analysis
2024-06-04-ucsb-containers adapting my own workflow with sharing (collaboration, transparency) in mind
2024-06-04-ucsb-containers Ways to efficiently perform data analysis and simulations within computationally intensive research. Also working remotely on the new server. How to set up containers on my own mac-OS desktop.
2024-06-04-ucsb-containers gain a better understanding of container use for research purposes and streamlining workflows
2024-06-10-ucsb-geospatial ’- Expanding my data science skills ; - Learning to do things I do in ArcGIS in R
2024-06-10-ucsb-geospatial Despite being in a geography Ph.D. program, I have little experience with more technical aspects of spatial data (I’m honestly not too sure what vector and raster data are). One of the reasons I have’t learned these things is because I didn’t want to use a proprietary GIS software and didn’t really want to have a seperate set of analyses done outside of R. So, I hope to learn some key definitions and concepts and how to implement them in R.
2024-06-10-ucsb-geospatial looking forward to new ways of analyzing geographic data
2024-06-10-ucsb-geospatial Basic processing steps for working with spatial data! And a review of CRS, projections, and how R shows you that information
2024-06-10-ucsb-geospatial Geospatial analysis in RStudio

Learning environment in the workshop

Code
orderedq <- c("Strongly Disagree", "Somewhat Disagree", "Neither Agree or Disagree","Somewhat Agree", "Strongly Agree")
addNA(orderedq)
Code
agree_questions <- results %>% 
  select(join_key, agree_apply.post,    agree_comfortable.post, agree_clearanswers.post,
         agree_instr_enthusiasm.post, agree_instr_interaction.post, agree_instr_knowledge.post
) %>% 
  filter(!if_all(-join_key, is.na))

n_agree_questions <- nrow(agree_questions)
  
agree_questions <- agree_questions %>%
  pivot_longer(cols = -join_key, names_to = "Question", values_to = "Response") %>% 
  mutate(Response = factor(Response, levels = orderedq),
         Question = recode(Question,
                     "agree_apply.post" = "Can immediatly apply 
 what they learned",
                     "agree_comfortable.post" = "Comfortable learning in 
 the workshop environment",
                     "agree_clearanswers.post" = "Got clear answers 
 from instructors",
                     "agree_instr_enthusiasm.post" = "Instructors were enthusiastic",
                     "agree_instr_interaction.post" = "Comfortable interacting 
 with instructors",
                     "agree_instr_knowledge.post" = "Instructors were knowledgeable 
 about the material"
      ))

summary_data <- agree_questions %>%
  count(Question, Response, name = "count") %>% 
  mutate(percent = (count / n_agree_questions) * 100,
         text = sprintf("%.0f (%.0f%%)", count, percent))

ggplot(summary_data, aes(x = Question, y = count, fill = Response)) +
  geom_col(position = "fill", color = "black", show.legend = TRUE) +
  scale_y_continuous(labels = scales::percent_format()) + 
  scale_fill_manual(values = c("Strongly Disagree" = "#d01c8b", 
                               "Somewhat Disagree" = "#f1b6da", 
                               "Neither Agree or Disagree" = "#f7f7f7", 
                               "Somewhat Agree" = "#b8e186", 
                               "Strongly Agree" = "#4dac26"), 
                    na.translate = TRUE, na.value = "#cccccc", 
                    breaks = orderedq, drop = FALSE) +
  geom_text(aes(label = text), size = 3,
             position = position_fill(vjust = 0.5)) +
  labs(y = "# respondents (Percentage)", x = element_blank(), fill = "Responses",
       subtitle = paste0("Number of responses: ", n_agree_questions)) +
  theme_minimal() +
  theme(axis.text.x = element_text(angle = 45, hjust = 1),
        plot.subtitle = element_text(hjust = 0.5, size = 12))

How an instructor or helper affected your learning experience

Code
results %>% 
  group_by(workshop) %>% 
  select(workshop, instructor_example.post) %>%
  drop_na()
workshop instructor_example.post
2024-05-01-ucsb-r was clear and slow paced
2024-05-01-ucsb-r very friendly and approachable (all of them!) so I felt comfortable asking simple questions
2024-05-01-ucsb-r I asked many questions because it’s my first time using R. I can not think of a single example.
2024-05-01-ucsb-r I came to the workshop to review my knowledge. so, I had no specific issue to follow the instructors. However, I realized that all were very helpful during the workshop to attendees.
2024-05-01-ucsb-r i had related and unrelated questions and the instructors gave clear examples and personal explanations that would be very tedious to find on the web!
2024-05-01-ucsb-r 1-1 help if there was a problem in the code, pace was good to ask questions and practice
2024-05-01-ucsb-r answered my question, made my question into a challenge exercise
2024-06-04-ucsb-containers I asked about underlying technology or other ways of doing things during the workshop and got my answers addressed.
2024-06-04-ucsb-containers Very knowledgeable, Ron was able to provide answers to implementation questions
2024-06-04-ucsb-containers Instructor and helpers came to our individual workstations to help trouble-shoot if we had difficulties. Excellent explanations also - both the steps we needed to take, and future steps to request additional resources/more complicated containers.
2024-06-10-ucsb-geospatial I got so lost in the end and I have been using R for 6 years. The directions were unclear and the instructor just kept jumping around
2024-06-10-ucsb-geospatial talking through why we need to add certain lines of codes or use certain commands is extremely helpful
2024-06-10-ucsb-geospatial Helpful to do challenge questions to reinforce learning - would be better if they were a bit more challenging, rather than just repeating what we just did

Skills and perception comparison

Code
# Calculate mean scores and make graph for all respondents (only_matched=FALSE)
tryCatch(
  {
mean_nresp <- get_mean_scores_nresp(results, only_matched=FALSE)
graph_pre_post(mean_nresp$mean_scores, mean_nresp$n_resp_pre, mean_nresp$n_resp_post, mean_nresp$n_resp_pre_post, only_matched=FALSE)
},
error = function(cond) {
message("Could not do the plots as there are no pre or post results to show")
}
)

Code
# Calculate mean scores and make graph for only matched respondents in pre and post (only_matched=TRUE)
tryCatch(
  {
mean_nresp <- get_mean_scores_nresp(results, only_matched=TRUE)
graph_pre_post(mean_nresp$mean_scores, mean_nresp$n_resp_pre, mean_nresp$n_resp_post, mean_nresp$n_resp_pre_post, only_matched=TRUE)
},
error = function(cond) {
message("Could not do the plots as there are no pre or post results to show")
}
)

Workshop Strengths

Code
results %>% 
  group_by(workshop) %>% 
  select(workshop, workshop_strengths.post) %>% 
  drop_na()
workshop workshop_strengths.post
2024-05-01-ucsb-r taught the overall basics as promised
2024-05-01-ucsb-r the fact that it is an intro workshop is great for those of us with little to no exposure to R. Having multiple instructors and helpers was also a plus.
2024-05-01-ucsb-r The number of instructors.
2024-05-01-ucsb-r jUPYTERHUB (having one more alternative platform to use rstudio), helpers, and instructors were well organized.
2024-05-01-ucsb-r exercises, enthusiastic instructors, good pacing, materials available online
2024-05-01-ucsb-r direct application to a variety of disciplines. We all need to clean and plot data, no matter the subject
2024-05-01-ucsb-r versatile - data wrangling and some data visualization
2024-06-04-ucsb-containers Clarity, well organized
2024-06-04-ucsb-containers Hands-on activities and comfortable pace and very friendly instructor and helpers.
2024-06-04-ucsb-containers Clear and well paced instructions
2024-06-04-ucsb-containers The instructions list was extremely helpful
2024-06-04-ucsb-containers Useful
2024-06-04-ucsb-containers This was the clearest explanation I have had on working in containers. Thank you!; Valued opportunities to ask questions - especially valued the instructor+helpers walking around and helping individuals to troubleshoot if needed.; I valued the end-resources as well — links to ACCESS and info on how to request cloud resources there.; The workshop was accessible to participants at a variety of skill/experience levels.
2024-06-10-ucsb-geospatial Accessibility
2024-06-10-ucsb-geospatial Good intro to lots of things
2024-06-10-ucsb-geospatial direct application for spatial plotting in R.
2024-06-10-ucsb-geospatial Beginner friendly, slow pace, easy to work with data
2024-06-10-ucsb-geospatial The lessons are clear and easy to follow

Ways to improve the workshop

Code
results %>% 
  group_by(workshop) %>% 
  select(workshop, workshop_improved.post) %>% 
  drop_na()
workshop workshop_improved.post
2024-05-01-ucsb-r explain each function more, ie. why and when we use certain functions
2024-05-01-ucsb-r Go a bit slower in some parts and cover some intermediate topics.
2024-05-01-ucsb-r This workshop should be given during one week or even one month to really prepare people who have never used it before. Two days are not enough.
2024-05-01-ucsb-r I attended most part of the first day and all was good!
2024-05-01-ucsb-r more exercises interspersed throughout would be helpful
2024-05-01-ucsb-r maybe time to practice with our own datasets
2024-05-01-ucsb-r personally, i’d like entire day on data visualization, separate day for data wrangling
2024-06-04-ucsb-containers shorter
2024-06-04-ucsb-containers I would value more information on interacting with your desktop/data storage location. For example, best practices in uploading data and downloading results, including addressing privacy issues if the data are confidential.
2024-06-10-ucsb-geospatial It’s more helpful to have the instructor walk through the lecture than than jumping around.
2024-06-10-ucsb-geospatial Streamline the second day
2024-06-10-ucsb-geospatial Good that we can plot vector and raster data, but making it look good with a basemap, good color palette, scale bar(?), north arrow(?), and line sizing would be more beneficial.
2024-06-10-ucsb-geospatial Go through a bit faster / cover more content. Or offer two sections (one for beginners and one for intermediate)
2024-06-10-ucsb-geospatial I think that people who have not worked with R before could benefit from a brief introduction on ggplot geoms and aesthetics

How likely are you to recommend this workshop? Scale 0 - 10

Code
orderedq <- c("Detractor", "Passive", "Promoter")

nps <- results %>% 
  count(recommend_group.post, recommende_score.post, name = "count") %>% 
  drop_na() %>% 
  mutate(recommend_group.post = factor(recommend_group.post, levels = orderedq),
         percent = (count/sum(count)) * 100,
         text = sprintf("%.0f (%.0f%%)", count, percent))

nps %>% 
ggplot(aes(x=recommende_score.post, y=count, fill=recommend_group.post)) +
  geom_col(color="black", show.legend = TRUE) +
  scale_fill_manual(values = c("Detractor" = "#af8dc3", "Passive" = "#f7f7f7", "Promoter" = "#7fbf7b"), breaks = c("Detractor", "Passive", "Promoter"), drop = FALSE) +
  geom_label(aes(label = text, vjust = -0.5), fill = "white", size= 3) +
  scale_x_continuous(breaks = 1:10) +
  labs(x = "NPS Score", y = "# respondents", subtitle = paste0("Number of responses: ", sum(nps$count), "
 Mean score: ", format(weighted.mean(nps$recommende_score.post, nps$count), digits = 3))) +
  theme_minimal() +
  theme(
    panel.grid.minor = element_blank(),
    panel.grid.major.x = element_blank(),
    plot.subtitle = element_text(hjust = 0.5, size = 12)
  ) +
  expand_limits(x = c(1,10),
                y = c(0, max(nps$count)*1.1))

Topic Suggestions

Code
results %>% 
  group_by(workshop) %>% 
  select(workshop, suggest_topics.post) %>% 
  drop_na()
workshop suggest_topics.post
2024-05-01-ucsb-r intermediate R, intro to GIS
2024-05-01-ucsb-r More days, more time to learn step by step. Consider having time to make some room for those of us who’d like to work upon a real database related to our own researches.
2024-05-01-ucsb-r using different types of analyses for social sciences in R
2024-05-01-ucsb-r timeseries
2024-05-01-ucsb-r R for Stata users? R for SAS users? (would be quicker pace)
2024-06-04-ucsb-containers advanced containarization and high performance computing
2024-06-04-ucsb-containers Setting up containers on our own machines - mac/linux. Using containers on CSC machines (if available).
2024-06-10-ucsb-geospatial plotting vector data over a raster RGB image, creating change maps of variables through time. I guess this would be more a more advanced spatial workshop.
2024-06-10-ucsb-geospatial text analysis?