library(tidyverse)
library(lubridate)

Read files into R.

feedback <- read.csv("feedback.csv")
today <- read.csv('today.csv')

Plot boxplots.

feedback <- feedback %>% filter(Timestamp == as_date("2021-06-17"))
feedback %>%
  ggplot(aes(x=Who.was.your.discussion.leader., y=Score)) +
  geom_boxplot() +
  theme(axis.title.x = element_blank(),
        axis.text.x = element_text(angle=90, hjust=1)) +
  labs(title = "Discussion Leader Feeback Boxplots")

How was today?

today <- today %>% filter(Timestamp == as_date("2021-06-17"))
today %>% select(6) %>% table %>% sort
.
average    good  great! 
      1       8      11 

What was good about today?

today$`What.was.good.about.today.s.lesson.` 
 [1] "I can say my opinion by Engulish."                                                                
 [2] "I very enjoyed this class."                                                                       
 [3] "I could enjoy communications with my classmates."                                                 
 [4] "I can speak English well."                                                                        
 [5] "I was able to talk more than usual."                                                              
 [6] "I was able to express my thoughts in English alone. It was nice to be able to discuss in English."
 [7] "I could enjoy taking communication with group member."                                            
 [8] "I can be talking with students."                                                                  
 [9] "Contents were interesting."                                                                       
[10] "I could have a good discussion."                                                                  
[11] "I spoke a lot."                                                                                   
[12] "Answered the question properly"                                                                   
[13] "I am glad I was able to talking with everyone."                                                   
[14] "All news topics are very interesting."                                                            
[15] "All topics were interesting."                                                                     
[16] "I could actively participate in the discussions."                                                 
[17] "All of the leaders' presentations were high-level."                                               
[18] "I could think well about themes."                                                                 
[19] "Most people tried to use only English as much as possible."                                       
[20] "I enjoyed talking with classmates."                                                               

What was not so good?

today$`What.was.not.so.good.`
 [1] "No"                                                                                                            
 [2] "I wasn't able to talk actively very much."                                                                     
 [3] "I couldn't see their face."                                                                                    
 [4] "nothing"                                                                                                       
 [5] "I spoke English a little"                                                                                      
 [6] "There was something I didn't understand in the leader's presentation. Therefore, I want to improve my English."
 [7] "I spoke a little Japanese."                                                                                    
 [8] "I can not be listening leader's English at all."                                                               
 [9] "We couldn't communicate with others well."                                                                     
[10] "I spoke a little too much Japanese."                                                                           
[11] "nothing"                                                                                                       
[12] "I didn't communicate much"                                                                                     
[13] "I had spoken Japanese a little."                                                                               
[14] "I used the same word a lot."                                                                                   
[15] "My English was not good."                                                                                      
[16] "Nothing."                                                                                                      
[17] "My dogs were barking to strangers."                                                                            
[18] "My Wi-fi condition wasn't good ."                                                                              
[19] "It took me some time to answer the discussion questions."                                                      
[20] "I think I should a lot of opinion."                                                                            

Who was interesting?

today %>% select(9) %>% table() %>% sort()
.
Yukitaka      Mai     Saki   Sayuna     Miho 
       2        3        3        4        8 

Why?

today %>% select(10) %>% summarise(`Discussion leader` = Why....8)
                                                                       Discussion leader
1                                                                       She talked a lot
2                                                       His report was very interesting.
3                                              Her questions were humor and interesting.
4                                          It's impressive that she was talking happily.
5                                                         She expanded the conversation.
6                        She asked us a lot. It was good that the discussion was lively.
7                                                             Topic is very interesting.
8                                       I think her topic is very interesting for Japan.
9                                                         She was very kind to everyone.
10                  She used PowerPoint to teach the topic in an easy to understand way.
11                                                                     Her quiz was fun!
12                                                      Actively talking to participants
13                                                     Her topic is interesting and fun.
14                                           Question was so interesting that I had fun.
15                                                         Her topic was familiar to me.
16                                    Because she  proceed with the discussion smoothly.
17                                                   I thought I should see the reality.
18                                    She gave responses to every participant's opinion.
19 The English she spoke was easy to hear and I was able to understand the content well.
20                                                         His question was interesting.

How many times did the participants give feedback today?

feedback %>% filter(Timestamp == as.Date("2021-06-17")) %>% select(`Who.are.YOU.`) %>% table
.
    Ayaka      Erii  Fukutome    Haruka      Kana     Kiara  Masatoki   Mashiro 
        5         5         5         5         5         5         5         5 
Mitsutaka     Miyuu  Mototoki    Nanase    Narumi  Nobukiyo  Norikane Shigetaka 
        4         6         5         5         5         5         5         6 
 Takeyuki Tsugifusa     Yuiri    Yukari 
        5         5         5         5 

Who was absent today?

Nobody

Who answered “How was today?”

today %>% select(5) %>% summarise(Participant = YOUR.Name) %>% arrange(Participant)
   Participant
1        Ayaka
2         Erii
3     Fukutome
4       Haruka
5         Kana
6        Kiara
7     Masatoki
8      Mashiro
9    Mitsutaka
10       Miyuu
11    Mototoki
12      Nanase
13      Narumi
14    Nobukiyo
15    Norikane
16   Shigetaka
17    Takeyuki
18   Tsugifusa
19       Yuiri
20      Yukari