Spring 2023 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("2023-05-16-ucsb-python", "2023-04-25-ucsb-git")

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

35

Both pre- and post-

8

Only pre-workshop

25

Only post-workshop

2

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
2023-04-25-ucsb-git Confidence and conceptual understanding of git. I am using it in my work but am finding my self taught ability with it is shaky and confused. I am hopeful that having someone experienced explain/answer questions will give me better understanding.
2023-04-25-ucsb-git I’d like a refresher/good foundation so I can really solidify my skills.
2023-04-25-ucsb-git Understanding git version control and management.
2023-04-25-ucsb-git Annotated version control and general organization habits for codes
2023-04-25-ucsb-git Some basic understanding of python
2023-04-25-ucsb-git Data analysis skills
2023-04-25-ucsb-git How to use github to organize and share my data/scripts
2023-04-25-ucsb-git Improve my usage of git and github
2023-05-16-ucsb-python I would like to go into research so I would just like to familiarize myself with the types of programming available to gain/apply to future jobs skills.
2023-05-16-ucsb-python Making batch plots easier
2023-05-16-ucsb-python I want to get to know Pandas.
2023-05-16-ucsb-python Exposure to coding in Python
2023-05-16-ucsb-python I have programmed in many things but not python or R, would like to level up
2023-05-16-ucsb-python Data manipulation and remote sensing
2023-05-16-ucsb-python Hopefully more knowledge in how to pull data from data sets and to make those reports reproducible. Also find better ways to present the data.
2023-05-16-ucsb-python The basics of working with data in Python
2023-05-16-ucsb-python I hope to refresh my programming skills and lean new ones as they are applicable to my current lab manager position and future phd research.
2023-05-16-ucsb-python I hope to learn the basics of python so that I can use this as a foundation for building further python skills related to my work.
2023-05-16-ucsb-python I’d like to be able to generate simple code that provides me the ability to make my own plots or analyze my data.
2023-05-16-ucsb-python Basic python skills, familiarity with coding in general
2023-05-16-ucsb-python To understand data formats in python, how to read/work/write matrices, vectors etc. If possible, also to understand and learn how to work with geographical data in formats of raster and vectors.
2023-05-16-ucsb-python how to use python
2023-05-16-ucsb-python a bit about using python
2023-05-16-ucsb-python syntax for Python

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
2023-04-25-ucsb-git both the instructors and helpers helped me solve problems on my computer promptly. i really appreciate it!
2023-04-25-ucsb-git They helped me solving errors that I found and answering questions in general
2023-04-25-ucsb-git Gave many opportunities for questions and requested feedback on topics that should be covered in more depth
2023-05-16-ucsb-python I liked that Seth stayed on script, so that if I got behind I could go to the lesson plan to copy and paste code if I got behind for whatever reason.
2023-05-16-ucsb-python They were very responsive, giving clear answers and stimulating us to explore the tools (test the coding logic etc)
2023-05-16-ucsb-python Great humor from Dr. Frew and clear examples from all instructors!

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
2023-04-25-ucsb-git the instructions are clear and I am able to get an overview of git, which i could not understand before attending the workshop
2023-04-25-ucsb-git Hands-on, simple, objective. Good descriptive webpages and well-documented step-by-step
2023-04-25-ucsb-git Being in person was very nice for technical help. I like the sticky note system.
2023-05-16-ucsb-python ’- Learning the basics of Python and comparing the similarities and differences in keywords and syntax to other languages; - Learning some of the benefits of shortcuts or efficiencies in Python compared to other languages; - The notes to have access to later on.; ;
2023-05-16-ucsb-python Being hands-on, but also having a ‘key’ posted so we can follow if we lose track
2023-05-16-ucsb-python Clear, well explained background on python - well designed lesson materials - comfortable pace - easy to ask questions and extend materials as needed

Ways to improve the workshop

Code
results %>% 
  group_by(workshop) %>% 
  select(workshop, workshop_improved.post) %>% 
  drop_na()
workshop workshop_improved.post
2023-04-25-ucsb-git I can’t think of any right now
2023-04-25-ucsb-git Some instructors and etxra help were in and out at variable times. Mac vs PC differences
2023-05-16-ucsb-python ’- If unique code is provided that is not in the lesson plan notes, add it to a second shared doc so attendees can access it as the teachers moves on, scrolling out of view the unique introduced code. Or share, other than via the big screen, a view of the instructor’s code as they write it. ;
2023-05-16-ucsb-python I cannot think of anything right now
2023-05-16-ucsb-python miss the old workshops with sandwiches!!! but generally this was amazing, would take another (part 2 with more advanced materials??)
2023-05-16-ucsb-python Less back and forth between different windows–could be improved by writing the lessons into the scripts that is filled out as we go (one of the modules was like this and felt much easier to follow along)

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
2023-04-25-ucsb-git Using Google Earth Engine through Python and/or R
2023-05-16-ucsb-python Spatial analysis in Python! Using Python (in Google Colab, for example) and Google Earth Engine to do some spatial analysis using satellite images, reanalysis data etc
2023-05-16-ucsb-python see prev answer - more python content
2023-05-16-ucsb-python more in-depth/dedicated workshop for writing more complicated functions, for loops, if statements, while statements, etc