What is the relationship between student’s time spent and final grade?

Is the relationship different by students’ gender?

Author

Siyu Long

Students’ Time Spent v.s. Final Grade

The plots in Figure 1 show the relationship between students’ final grade and time spent by hours. Every score of the observations is distinguished by gender (F in red, m in blue).

Code
scatterplot <- ggplot(course_data2, aes(x = TimeSpent_hours, y = final_grade, color = Gender)) +
  geom_point() +
  geom_smooth(method = "lm", se = FALSE) +
  labs(title = "Students' Time Spent vs. Final Grade",
       x = "Students' Time Spent by Hours",
       y = "Students' Final Grade",
       color = "Gender") +
  scale_color_brewer(palette = "Set1")
scatterplot
`geom_smooth()` using formula = 'y ~ x'

Figure 1: the relationship between student’ time spent and final grade.

The Figure 1 plot shows that in the time spent range of 0-100 hours, students’ final grades show a primarily positive correlation with time, especially as the majority of students achieve high grades within the 0-50 hours timeframe.

Time Spent v.s. Final Grade by Gender

The two plots, Figure 2 (a) and Figure 2 (b), separtely show the relationship between final grades of students in different gender groups and time spent by hours.

Code
female_data <- course_data2 %>% filter(Gender == "F")
male_data <- course_data2 %>% filter(Gender == "M")

scatterplot_female <- ggplot(female_data, aes(x = TimeSpent_hours, y = final_grade, color = Gender)) +
  geom_point(color = "red") +
  labs(title = "Female Students' Time Spent vs. Final Grade",
       x = "Students' Time Spent by Hours",
       y = "Students' Final Grade") +
  scale_color_manual(values = "red")
scatterplot_female

scatterplot_male <- ggplot(male_data, aes(x = TimeSpent_hours, y = final_grade, color = Gender)) +
  geom_point(color = "blue") +
  labs(title = "Male Students' Time Spent vs. Final Grade",
       x = "Students' Time Spent by Hours",
       y = "Students' Final Grade") +
  scale_color_manual(values = "blue")
scatterplot_male

(a) Color by female students’ final grades

(b) Color by male students’ final grades

Figure 2: the relationship between student’ time spent and final grade by gender.

The Figure 2 plots show similar results to what Figure 1 displays. Within the time spent range of 0-100 hours, both female and male students show a positive correlation between their final grades and time spent. In particular, a significant proportion of students achieve high grades within the 0-50 hours timeframe. The scatterplot distributions for female and male students appear to be quite similar.