x <- read.csv("oe2_2020_feedback_anon.csv")
x$Timestamp <- dmy_hms(x$Timestamp)
x[,3:13] <- lapply(x[,3:13], as.factor)
x$Score <- word(x$Score) %>% as.numeric
x <- x %>% filter(Timestamp < as.Date("2020-08-01"))
x %>% ggplot(aes(x=Who.was.your.discussion.leader.,
y = Who.are.YOU.)) +
geom_tile(aes(fill=Score)) +
labs(title = "Discussion Leaders' Feedback Scores - 2020 Spring",
x="participant",
y = "discussion leader") +
theme(axis.text.x = element_text(angle=90, hjust=1)) +
scale_fill_gradient(low = "purple", high = "green")
Comment 2: The participants assessments were mostly positive and discussion leaders scores were generally consistent.
y <- read.csv("oe2_2021_feedback_anon.csv")
y$Timestamp <- ymd_hms(y$Timestamp)
y[,3:13] <- lapply(y[,3:13], as.factor)
y %>% ggplot(aes(x=Who.was.your.discussion.leader.,
y = Who.are.YOU.)) +
geom_tile(aes(fill=Score)) +
labs(title = "Discussion Leaders' Feedback Scores - 2021 Spring",
x="participant",
y = "discussion leader") +
theme(axis.text.x = element_text(angle=90, hjust=1)) +
scale_fill_gradient(low = "purple", high = "green")
Comment 2: The participants assessments were mostly negative.
y$hour <- hour(y$Timestamp)
y$minute <- minute(y$Timestamp)
y$timing <- (y$hour - 9)*60 + y$minute
y %>% filter(Timestamp <= as_date("2021-04-30") &
Timestamp >= as_date("2021-04-28")) %>%
filter(timing<100) %>%
filter(timing>0) %>%
ggplot(aes(x=Who.are.YOU., y=timing)) +
geom_point() +
labs(title = "Participation Times - April 29th",
x = "participant") +
theme(axis.text.x = element_text(angle=90, hjust=1))
Comment: Kana and Takayuki had been absent from class yet they still “participated” by providing feedback to the discussion leaders via their Google forms.
Decision: Plot the point graph and include the absentee students’ names in the whole class feedback report so that they may be discouraged from doing so again.
wk4 <- c(1,1,3,6,5)
wk8 <- c(0,0,1,8,11)
df = rbind(wk4, wk8)
colnames(df) <- c("terrible", "not_so_good", "average", "good", "great")
chisq.test(df)
## Warning in chisq.test(df): Chi-squared approximation may be incorrect
##
## Pearson's Chi-squared test
##
## data: df
## X-squared = 5.1549, df = 4, p-value = 0.2718
Comment: There was no difference between the two lessons.
Comment 1: Each square represents the average of two scores that one participant gave to a discussion leader in one semester.