Spring 2025 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("2025-05-01-ucsb-r", "2025-04-29-ucsb-computing", "2025-04-16-ucsb-gitcollab", "2025-04-14-ucsb-git", "2025-04-11-ucsb-shell", "2025-04-10-ucsb-shell")

results <- read_csv("data-joined/all_workshops.csv") %>% 
  filter(workshop %in% workshops)
  
# Fix comma separator
results <- results %>% 
  mutate(findout_select.pre = str_replace_all(
  findout_select.pre, 
  "Twitter, Facebook, etc.", 
  "Twitter; Facebook; etc."))

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

80

Both pre- and post-

25

Only pre-workshop

38

Only post-workshop

17

Departments

Code
depts <- results %>% select(dept_select.pre) %>% 
  separate_rows(dept_select.pre, sep=",") %>%
  mutate(dept_select.pre = str_trim(dept_select.pre)) %>%
  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=",") %>%
  mutate(occupation.pre = str_trim(occupation.pre)) %>%
  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=",")  %>% 
  mutate(motivation_select.pre = str_trim(motivation_select.pre)) %>%
  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=",")  %>% 
  mutate(findout_select.pre = str_trim(findout_select.pre)) %>%
  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
2025-04-10-ucsb-shell I hope to learn UNIX to set me up for better version control
2025-04-10-ucsb-shell I work with a lot of data and often times my job is to fix large amounts of data and I have to do it manually one by one. I hope to learn tactics to speed up this process and make my work quicker and cleaner.
2025-04-11-ucsb-shell Skills that will be useful employment
2025-04-11-ucsb-shell I use basic bash commands but I honestly have to google things constantly and it would be nice to just get a more formal education/practice on navigating directories in the terminal since I do this so often for pushing and pulling things to Git/Github. The rest of the workshop seems interesting just for learning sake but the above is a more specific thing I hope to strengthen.
2025-04-11-ucsb-shell I would like to learn the basics of working in linux with file directories, running programs, simple commands. I will need to be able to do this for some upcoming data analysis.
2025-04-11-ucsb-shell learn how to use this and apply to real-life cases
2025-04-11-ucsb-shell best practices for running code and storing data; integrating with RStudio; helpful tips of useful commands
2025-04-11-ucsb-shell New programming skills
2025-04-10-ucsb-shell i think i can come away able to do some tasks related to running and troubleshooting scripts other people have written me, dealing with software installation and errors, etc. stretch goal is do scripting to automate repetitive tasks.
2025-04-10-ucsb-shell I am hoping to learn more about how to use a computer
2025-04-11-ucsb-shell Thank you! I have been offered the use of supercomputing resources from my old postdoc position, and I would like to improve my Unix skills to make full use of this resource. I currently use MATLAB on my compter/laptop and am learning Python and Jupyter notebook. My Unix skills are very limited. The Python interfaces with the supercomputing environment are well-developed. I hope to learn more about how I can help to acess the resources more easily.
2025-04-16-ucsb-gitcollab Application and resources to learn more after the workshop
2025-04-10-ucsb-shell Just the basic framework of understanding
2025-04-10-ucsb-shell I know the very basic shell commands but would like to learn how to actually read and write shell scripts
2025-04-11-ucsb-shell I’ve never really understood what the Terminal app on my MacBook did, so I am hoping to learn more about it. Beyond that, I am hoping to acquire new skills that will help me manage data.
2025-04-16-ucsb-gitcollab Getting familar with what I can use GitHub for
2025-04-14-ucsb-git I am looking forward to learning the basics of Git and GitHub in a group setting from the awesome DREAM Lab Team!
2025-04-11-ucsb-shell Unix Shell
2025-04-16-ucsb-gitcollab I hope to gain confidence in Git and Github to where it is no longer confusing
2025-04-16-ucsb-gitcollab learning how to use github correctly without overwriting my lab’s established code. overall want to feel more confident and competent at using and understanding github
2025-04-11-ucsb-shell I want to be a data scientist, so I think it is really important to understand Unix systems
2025-04-16-ucsb-gitcollab How to work more efficiently with GitHub and work collaboratively with others
2025-04-14-ucsb-git I hope to learn what Git and GitHub are, how to install them, and how to use them in a way that will enhance rather than disrupt my workflow.
2025-04-14-ucsb-git Basic grasp of what Git and Github are, and their applications.
2025-04-14-ucsb-git i want to get a basic knowledge of this software.
2025-04-14-ucsb-git To understand what Git is and how to use it
2025-04-14-ucsb-git I hope to learn the basics and how to better use GitHub since I only have brief knowledge of a professor showing me the basics and learning on my own.
2025-04-16-ucsb-gitcollab Gain confidence to using github independently
2025-04-16-ucsb-gitcollab I am hoping to learn the best practices for collaborating with GitHub and creating reproducible data with good file management.
2025-04-16-ucsb-gitcollab some github skills that I didn’t learn before
2025-04-16-ucsb-gitcollab develop my knowledge of Git
2025-04-16-ucsb-gitcollab How to commit and/or update code when working on teams and fix conflicts
2025-04-16-ucsb-gitcollab how to collaborate more efficiently
2025-05-01-ucsb-r I want to be proficient in R
2025-05-01-ucsb-r neural connectome data analysis requires R interface - I want to do it myself instead of asking other people for help all the time!
2025-04-29-ucsb-computing how to use clusters to run R/stan for statistical computing.
2025-04-29-ucsb-computing UCSB computing resources for HPC work
2025-05-01-ucsb-r Learning how to best analyze data for the social sciences, in quick and efficient way.
2025-05-01-ucsb-r I need to do next school year a research and need to put data into R and want to learn how to do it and read it and what you can get out of the data
2025-05-01-ucsb-r I want to learn R language for my future course (EEMB 146) and can apply them in my work
2025-05-01-ucsb-r become familiar with ggplot 2 and tidyverse
2025-05-01-ucsb-r learn how to code

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
2025-04-10-ucsb-shell It was a smaller class, so it was nice to have that one-on-one feeling. I am not very knowledgeable about this subject and felt comfortable asking basic questions or further explanation on jargon. Both Seth and Jose were great!
2025-04-11-ucsb-shell Loved having the opportunity to ask extra questions in the chat to go a little deeper without disrupting the presenters since there were multiple instructors. This was nice bc in person that wouldn’t have been an option! Got some nice extra information about specific questions.
2025-04-11-ucsb-shell I appreciated the react function in zoom allowing me to let the instructors know when I was experiencing issues. They always made sure to pause and help me troubleshoot so I continue following along.
2025-04-10-ucsb-shell Jose helped me get un-stuck so I could catch up with the real-time examples the other instructor was presenting
2025-04-10-ucsb-shell They noticed I was struggling and came to help me with the commands
2025-04-11-ucsb-shell I was a little slow catching in that you have time be in the folder or directory in order to perform actions on it. The instructors were patient and made sure to walk through the commands again if we did not understand. I really appreciated that as it made the conference a safe space for literally ALL attendees.
2025-04-10-ucsb-shell Very responsive to questions
2025-04-11-ucsb-shell The instructors were very quick to answer questions in chat and out loud. This made it very easy to catch up if you fell behind.
2025-04-14-ucsb-git Jose is a great resource. He helped make sure we were prepared before the workshop began by having the room open from 9 AM. I really appreciated that! He answers questions clearly and kindly.
2025-04-11-ucsb-shell Very enthusiastic and helpful also gave helpful tips and tricks
2025-04-11-ucsb-shell Open to answering questions and had a breakroom to work on issues a student was having one on one.
2025-04-14-ucsb-git Instructors affected my learning experience by:

– Rushing through material, resulting in me feeling lost, confused, and inept; – Audibly talking to one another about worrying that they were running overtime, undermining confidence in the workshop and instilling a sense of shame in me for not understanding more quickly; – Acting confused by questions about morals, ethics, and privacy, implicitly dismissing students’ concerns about such; – Repeatedly modifying instructions immediately given with accompanying warnings about how following the instruction incorrectly would result in negative consequences, creating uncertainty and fear about whether an instruction was safe to follow or would harm a student’s device | |2025-04-14-ucsb-git |All the instructors at the workshop were really friendly and helped me when I had questions and issues with the tasks - thanks to José and Jairo in particular! | |2025-04-16-ucsb-gitcollab |I gained a better understanding of what a fork is and in what instances you may want to use a fork(s) when collaborating | |2025-04-16-ucsb-gitcollab |The activities were clearly structured and well organised and the instructors were friendly, knowledgeable, and helpful | |2025-04-16-ucsb-gitcollab |I gained a better understanding of what a fork is and in what instances you may want to use a fork(s) when collaborating | |2025-05-01-ucsb-r |Tess sat next to me and was very quick to respond to my whispered questions | |2025-05-01-ucsb-r |answered questions patiently | |2025-05-01-ucsb-r |if I got stuck they helped me | |2025-05-01-ucsb-r |I shared an R assistant with one other student – incredible to have that much attention and help available! I had several questions and all were answered by the tutor or the instructor. Thank you for moving so slow, it was the right pace for a beginner. | |2025-04-11-ucsb-shell |Answered any questions I had, and made sure no one was behind, so everyone was on the same page | |2025-04-11-ucsb-shell |I had a nested folder for shell-lesson-data that they were able to help me discover to get to the files I needed for the course. The were able to figure this out for me quickly so I could continue on with the course. | |2025-04-10-ucsb-shell |I sat next to one and his answers were quick and correct to the questions I had | |2025-04-14-ucsb-git |Clarified the differences between initializing inside the terminal vs outside and the consequences of doing so | |2025-04-14-ucsb-git |Having an instructor seated at my table was great to have immediately help when I ran into a computer issue | |2025-04-14-ucsb-git |Having the sticky notes made it easier to communicate when I had problems | |2025-04-16-ucsb-gitcollab |Getting lots of opportunities to ask questions about what we were doing and making sure I understood what was happening | |2025-04-29-ucsb-computing |They are super friendly! | |2025-04-29-ucsb-computing |I asked about Jupyter notebook and i’ve got the answer . | |2025-04-29-ucsb-computing |always available to answer questions | |2025-05-01-ucsb-r |they always come right away to help when I had questions |

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
2025-04-10-ucsb-shell I like the github worksheet that summarizes the workshop. They gave a lot of information in a short amount of time so this was helpful to keep track.
2025-04-11-ucsb-shell Easy to follow, digestible, clear, etc.
2025-04-11-ucsb-shell The repetition of commands was very helpful in learning how to interact with the interface.
2025-04-10-ucsb-shell Clear organized lectures and notes/exercise files. Small enough # of students that I think everybody got to ask their questions and get help when they needed it. Instructors are clear and helpful.
2025-04-10-ucsb-shell It is good to do this in person and see the instructor doing the commands and trying to follow along. Then you can practice later to see if you can remember it. It is good how much information they are able to share during the workshop and they have a website you can refer to later. It really helped to have people around that are comfortable with the software.
2025-04-11-ucsb-shell I liked that the instructors encouraged questions and were very patient. I also liked that the kesson was published to practice ahead of time. I regret not taking advantage of this feature.
2025-04-10-ucsb-shell Highly applicable to so many different things
2025-04-11-ucsb-shell Instructors were very approachable with questions, knowledgeable about the subject, and very friendly.
2025-04-14-ucsb-git Knowledgable instructors, good system for getting help (love the sticky notes), and amble time to ask and answer questions. Overall 10/10!
2025-04-11-ucsb-shell Interactive, easy to follow along. Prefer the zoom environment
2025-04-14-ucsb-git A strength of the workshop was simulcasting the instructor’s screen on screens at every table. Being able to see the instructor’s command line and try to follow along at least helped a little bit.
2025-04-14-ucsb-git Clear tasks, well organised,
2025-04-16-ucsb-gitcollab Enthusiasm of instructors and the workshop materials
2025-04-16-ucsb-gitcollab The questions got answers clearly. The pace is just right.
2025-04-16-ucsb-gitcollab Presentation and knowledge of the instructors
2025-04-16-ucsb-gitcollab Enthusiasm of instructors and the workshop materials
2025-05-01-ucsb-r instructors very attentive
2025-05-01-ucsb-r it was a start. the one-to-one help was generous.
2025-05-01-ucsb-r see how codes work and what which word is doing
2025-05-01-ucsb-r 1) High number of table tutors so it was like a 1:1 or 1:2 ratio of tutor to student. ; 2) Slow pace; 3) Kind and approachable instructors; 4) Access to the lessons online to review or since I missed one day
2025-04-11-ucsb-shell good information to learn, instructors interact with students and tries their best to answer questions
2025-04-11-ucsb-shell We learned many different actions that can be performed in the terminal
2025-04-10-ucsb-shell Really slow
2025-04-14-ucsb-git Patience of instructors
2025-04-14-ucsb-git I really enjoyed learning more about GitHub and seeing how I can upload directly to GitHub from my device.
2025-04-14-ucsb-git Getting the basics of GIt and understanding when and why to use GIt
2025-04-16-ucsb-gitcollab The major strengths of this workshop was highlighting just how useful Git and Github can be for collaborative projects that require people to be able to maintain version history
2025-04-29-ucsb-computing Introduce a resource to university community that they might not know
2025-04-29-ucsb-computing Well organized and answered some of my questions
2025-04-29-ucsb-computing Exposure to the different options and a brief introduction of how to apply them
2025-04-29-ucsb-computing good demonstration of capabilities of our computing system and staff expertise
2025-05-01-ucsb-r a lot of resources on their website and a lot of instructors there to help

Ways to improve the workshop

Code
results %>% 
  group_by(workshop) %>% 
  select(workshop, workshop_improved.post) %>% 
  drop_na()
workshop workshop_improved.post
2025-04-10-ucsb-shell The instructors went really fast and it was easy to get behind because while some understood right away, others who were struggling needed help while they were still giving information. Some of the helpers didn’t seem to be helping.
2025-04-11-ucsb-shell Im left slightly unsatisfied with how I would use these - it seems like maybe it would be easier to just open the folders and make changes directly but maybe there are times where you can’t do that? That extra context would be nice. I did learn a lot about file navigation though and that will be great for when I’m pushing and pulling to github on my terminal as before this workshop I wasn’t very effective at that navigation.
2025-04-11-ucsb-shell The beginning of the workshop moved very quickly. It would be helpful especially during the start for beginners if the instructor paused so I could read the commands they typed before the executed the command.; Also, viewing the Windows interface was much easier than the mac because of the color coding, so I would have preferred to have seen that interface the entire time.
2025-04-10-ucsb-shell It’s hard to get the pace right. The first hour or so was awfully slow and then the more complicated stuff at the end was rushed.
2025-04-10-ucsb-shell For me, I have no background with the terminology. I think it is a great workshop but just harder for me since I was slower to understand the new information.
2025-04-11-ucsb-shell I had a hard time managing the ’ thumbs up’ feature when asked. I found I could either follow, or respond. Again, I need to invest in another screen which would make this easier. I have a tiny laptop screen.
2025-04-11-ucsb-shell I am not sure if it was beyond the scope of the workshop, but I thought it would have been helpful to see some applications of why I would use the shell instead of the GUI. I feel like the things I learned today (moving between directories, renaming files, copying files, etc.) I could’ve just done easier in the GUI.
2025-04-14-ucsb-git No notes!
2025-04-14-ucsb-git The workshop could be improved in the following ways (nonexhaustive):; ; - Be more prepared for student confusion, especially in a workshop advertised as being suitable for beginners.; - Instruct more clearly, using sentences that don’t require immediate caveats for fear of prompting a student to do something catastrophic to their computers; - Understand Git and GitHub more thoroughly. More than once, instructors confessed their ignorance about how to answer seemingly elementary questions about the programs. They seemed to know how to plug commands into Git but not how or why any of it worked.; – Explain the utility of Git and GitHub. The case for why or how these tools improve upon information management practices students might already be using was rarely made persuasively.; – Teach students how to protect their privacy from malicious actors. In an age of “cyber stalking,” “doxxing,” and grassroots fascist threats (and even violence) against people in higher education, I was frankly flabbergasted by the instructors’ devil-may-care attitude toward students connecting themselves to an open-access repository from which information seemingly cannot readily be deleted.; - Divest from tools that depend on Large Language Models (LLMs, sometimes spuriously called “AI”). UCSB is a university committed to learning, and no educational entity should encourage students to use plagiarism machines that discourage critical thinking.
2025-04-16-ucsb-gitcollab It was confusing and the end was rushed - I couldn’t tell what application was being used or how I would apply it
2025-04-16-ucsb-gitcollab 1) Grounding participants in task and workflow. There were different instruction materials and when lost or behind it was hard to determine which materials to use to get back on track.; 2) At times hard to concentrate on the instructor instructions due to many task and side conversations happening at once ; ; Maybe having one source of instruction or if there are multiple follow one and tell students which workshop material to follow since at times these instructions deviated and at times hard to tell which material was the default and at what point in time a different solution/ alternative method was being used.
2025-04-16-ucsb-gitcollab 1) Grounding participants in task and workflow. There were different instruction materials and when lost or behind it was hard to determine which materials to use to get back on track.; 2) At times hard to concentrate on the instructor instructions due to many task and side conversations happening at once ; ; Maybe having one source of instruction or if there are multiple follow one and tell students which workshop material to follow since at times these instructions deviated and at times hard to tell which material was the default and at what point in time a different solution/ alternative method was being used.
2025-05-01-ucsb-r more coding
2025-05-01-ucsb-r it’s a lot to learn. customizing/matching it to the kind of analysis I want to do was challenging. people came in at many levels and some things were distracting. I’m not sure how it could be improved - it was a start.
2025-04-29-ucsb-computing having interactive examples
2025-05-01-ucsb-r maybe more on data that we get to see first where it is coming from
2025-05-01-ucsb-r When I look at internships for social science research, they ask for knowledge of specific packages… tidyverse, ggplot are super common. Maybe focusing on developing or showing us how to build a cheatsheet of how to document where to list what diff packages are used for so we can refer to it quickly for interviews or our own work.
2025-04-11-ucsb-shell I think it was great. I liked the breaks in the middle.
2025-04-11-ucsb-shell Sometimes it went a bit quickly, particularly when multiple lines of code were needed for an exercise. I was usually able to catch up though!
2025-04-10-ucsb-shell Really slow
2025-04-14-ucsb-git N/A
2025-04-14-ucsb-git It would be helpful if there was some time at the beginning to elaborate on some of the vocabulary (commits, staging, adds, etc). I felt like it wasn’t clear to me until the very end exactly what I was doing/trying to do. Also, I still do not feel clear on which of the setup steps of connecting GitBash to the online GitHub need to be completed during each start up of the software vs now it is setup and I do not need to recreate the keys.
2025-04-14-ucsb-git list of commands of Git
2025-04-16-ucsb-gitcollab Giving more time for breaks
2025-04-29-ucsb-computing People typically program in one language, not mixing the programming language would be better. Longer workshop with hands on exercise would be helpful when describing the HPC resource and parallel computing.
2025-04-29-ucsb-computing Consider restructuring this series: all R users, all jupyter users, etc. I only use R for my research, so a more thorough workshop on how to accomplish these tasks using R would have been more beneficial than just the first few minutes of the workshop.
2025-04-29-ucsb-computing more complete walk-through of preparing, submitting, and receiving results from a job
2025-05-01-ucsb-r sometimes im confused by what each function means

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
2025-04-10-ucsb-shell Would be cool to have a masterclass on excel.
2025-04-11-ucsb-shell Im looking forward to the upcoming R/Python text analysis workshop!
2025-04-10-ucsb-shell Maybe a Part 2 of this class. I’m looking forward to the one on interacting with APIs for people who are bad at programming I mean working on getting better at programming.
2025-04-10-ucsb-shell No : )
2025-04-11-ucsb-shell I am not sure, but I wish all instructors were as helpful and kind as you! I will try to attend another one.
2025-04-14-ucsb-git Sourcing data for research projects, navigating archival data, etc.
2025-04-14-ucsb-git – How to protect our information online; – How to protect our scholarship and other work from piracy, especially by Large Language Models (LLM, sometimes misleadingly called “AI”); – The ethical and academic dangers of Large Language Models (LLM, sometimes misleadingly called “AI”)
2025-04-16-ucsb-gitcollab I think there needs to be a bit more explanation for why we are doing what we’re doing
2025-04-14-ucsb-git Open refine
2025-04-16-ucsb-gitcollab Workshop focused solely on github and Rstudio collaborations
2025-04-16-ucsb-gitcollab intermediate python programming
2025-04-16-ucsb-gitcollab Workshop focused solely on github and Rstudio collaborations
2025-05-01-ucsb-r work with a dataset about sharks
2025-05-01-ucsb-r I like the one-on-one help option.
2025-04-29-ucsb-computing hands-on cluster computing workshop with real examples
2025-05-01-ucsb-r no
2025-05-01-ucsb-r Can you have examples for social science research used – datasets, how to present data in descriptive tables, descriptive statistics,etc
2025-04-11-ucsb-shell No. It was good.
2025-04-11-ucsb-shell Nope!
2025-04-10-ucsb-shell Go like 25% faster
2025-04-14-ucsb-git N/A
2025-04-16-ucsb-gitcollab CRM Workshop
2025-04-29-ucsb-computing Use of HPC and parallel computation
2025-04-29-ucsb-computing A more in depth tutorial for each application
2025-04-29-ucsb-computing Python for ArcGIS