edu_Df <- read.csv("C:/Users/PC/Documents/R_4DS/Education/xAPI-Edu-Data.csv")

Data Attributes

1 Gender - student’s gender (nominal: ‘Male’ or ‘Female’)

2 Nationality- student’s nationality (nominal:’ Kuwait’,’ Lebanon’,’ Egypt’,’ SaudiArabia’,’ USA’,’ Jordan’,’ Venezuela’,’ Iran’,’ Tunis’,’ Morocco’,’ Syria’,’ Palestine’,’ Iraq’,’ Lybia’)

3 Place of birth- student’s Place of birth (nominal:’ Kuwait’,’ Lebanon’,’ Egypt’,’ SaudiArabia’,’ USA’,’ Jordan’,’ Venezuela’,’ Iran’,’ Tunis’,’ Morocco’,’ Syria’,’ Palestine’,’ Iraq’,’ Lybia’)

4 Educational Stages- educational level student belongs (nominal: ‘lowerlevel’,’MiddleSchool’,’HighSchool’)

5 Grade Levels- grade student belongs (nominal: ‘G-01’, ‘G-02’, ‘G-03’, ‘G-04’, ‘G-05’, ‘G-06’, ‘G-07’, ‘G-08’, ‘G-09’, ‘G-10’, ‘G-11’, ‘G-12 ‘)

6 Section ID- classroom student belongs (nominal:’A’,’B’,’C’)

7 Topic- course topic (nominal:’ English’,’ Spanish’, ‘French’,’ Arabic’,’ IT’,’ Math’,’ Chemistry’, ‘Biology’, ‘Science’,’ History’,’ Quran’,’ Geology’)

8 Semester- school year semester (nominal:’ First’,’ Second’)

9 Parent responsible for student (nominal:’mom’,’father’)

10 Raised hand- how many times the student raises his/her hand on classroom (numeric:0-100)

11- Visited resources- how many times the student visits a course content(numeric:0-100)

12 Viewing announcements-how many times the student checks the new announcements(numeric:0-100)

13 Discussion groups- how many times the student participate on discussion groups (numeric:0-100)

14 Parent Answering Survey- parent answered the surveys which are provided from school or not (nominal:’Yes’,’No’)

15 Parent School Satisfaction- the Degree of parent satisfaction from school(nominal:’Yes’,’No’)

16 Student Absence Days-the number of absence days for each student (nominal: above-7, under-7)

The students are classified into three numerical intervals based on their total grade/mark:

  1. Low-Level: interval includes values from 0 to 69,

  2. Middle-Level: interval includes values from 70 to 89,

  3. High-Level: interval includes values from 90-100.

str(edu_Df)
## 'data.frame':    480 obs. of  17 variables:
##  $ gender                  : Factor w/ 2 levels "F","M": 2 2 2 2 2 1 2 2 1 1 ...
##  $ NationalITy             : Factor w/ 14 levels "Egypt","Iran",..: 5 5 5 5 5 5 5 5 5 5 ...
##  $ PlaceofBirth            : Factor w/ 14 levels "Egypt","Iran",..: 5 5 5 5 5 5 5 5 5 5 ...
##  $ StageID                 : Factor w/ 3 levels "HighSchool","lowerlevel",..: 2 2 2 2 2 2 3 3 3 3 ...
##  $ GradeID                 : Factor w/ 10 levels "G-02","G-04",..: 2 2 2 2 2 2 5 5 5 5 ...
##  $ SectionID               : Factor w/ 3 levels "A","B","C": 1 1 1 1 1 1 1 1 1 2 ...
##  $ Topic                   : Factor w/ 12 levels "Arabic","Biology",..: 8 8 8 8 8 8 9 9 9 8 ...
##  $ Semester                : Factor w/ 2 levels "F","S": 1 1 1 1 1 1 1 1 1 1 ...
##  $ Relation                : Factor w/ 2 levels "Father","Mum": 1 1 1 1 1 1 1 1 1 1 ...
##  $ raisedhands             : int  15 20 10 30 40 42 35 50 12 70 ...
##  $ VisITedResources        : int  16 20 7 25 50 30 12 10 21 80 ...
##  $ AnnouncementsView       : int  2 3 0 5 12 13 0 15 16 25 ...
##  $ Discussion              : int  20 25 30 35 50 70 17 22 50 70 ...
##  $ ParentAnsweringSurvey   : Factor w/ 2 levels "No","Yes": 2 2 1 1 1 2 1 2 2 2 ...
##  $ ParentschoolSatisfaction: Factor w/ 2 levels "Bad","Good": 2 2 1 1 1 1 1 2 2 2 ...
##  $ StudentAbsenceDays      : Factor w/ 2 levels "Above-7","Under-7": 2 2 1 1 1 1 1 2 2 2 ...
##  $ Class                   : Factor w/ 3 levels "H","L","M": 3 3 2 2 3 3 2 3 3 3 ...
head(edu_Df)
##   gender NationalITy PlaceofBirth    StageID GradeID SectionID Topic Semester
## 1      M          KW       KuwaIT lowerlevel    G-04         A    IT        F
## 2      M          KW       KuwaIT lowerlevel    G-04         A    IT        F
## 3      M          KW       KuwaIT lowerlevel    G-04         A    IT        F
## 4      M          KW       KuwaIT lowerlevel    G-04         A    IT        F
## 5      M          KW       KuwaIT lowerlevel    G-04         A    IT        F
## 6      F          KW       KuwaIT lowerlevel    G-04         A    IT        F
##   Relation raisedhands VisITedResources AnnouncementsView Discussion
## 1   Father          15               16                 2         20
## 2   Father          20               20                 3         25
## 3   Father          10                7                 0         30
## 4   Father          30               25                 5         35
## 5   Father          40               50                12         50
## 6   Father          42               30                13         70
##   ParentAnsweringSurvey ParentschoolSatisfaction StudentAbsenceDays Class
## 1                   Yes                     Good            Under-7     M
## 2                   Yes                     Good            Under-7     M
## 3                    No                      Bad            Above-7     L
## 4                    No                      Bad            Above-7     L
## 5                    No                      Bad            Above-7     M
## 6                   Yes                      Bad            Above-7     M

Our outcome variable is the class ordinal variable

Data Cleaning

colSums(is.na(edu_Df)) #=> 0
##                   gender              NationalITy             PlaceofBirth 
##                        0                        0                        0 
##                  StageID                  GradeID                SectionID 
##                        0                        0                        0 
##                    Topic                 Semester                 Relation 
##                        0                        0                        0 
##              raisedhands         VisITedResources        AnnouncementsView 
##                        0                        0                        0 
##               Discussion    ParentAnsweringSurvey ParentschoolSatisfaction 
##                        0                        0                        0 
##       StudentAbsenceDays                    Class 
##                        0                        0

Outcome Variable Distribution

options(repr.plot.height=4)

## Plot bars with Numeric Labels
edu_Df %>%
  count(Class) %>%
  ggplot(aes(x = reorder(factor(Class), -n), y = n)) +
  geom_bar(stat = "identity") +
  geom_text(aes(label = n),
            vjust = -0.5) +
  theme_minimal() +
  # geom_label(stat = "count", aes(label = ..count..)) +
  labs(x = "Grade Class",
       y = "Frequency",
       title = "Student Outcome by Grade Class")

Middle Grades are most common than otherwise - A good exercise is to find out to what percentage?

distrribution of Factors and Numerical Variables

numericVars <- select_if(edu_Df, is.numeric)
factorVars <- select_if(edu_Df, is.factor)

cat("This dataset has ", length(numericVars), "numeric Variables and ", length(factorVars),"factor Variables")
## This dataset has  4 numeric Variables and  13 factor Variables

Let us visualize this distribution starting with each Variable Type

## Function to automate Distribution Plots for Factor Variables
auto_factor_plot <- function(.data) {
  ## Type of Variable
  nm <- names(.data)
  
## loop to plot through
  for (i in seq_along(nm)) {
    plot <- .data %>%
              ggplot(aes_string(x = nm[i])) + 
                    geom_histogram(alpha = .5,fill = "mediumseagreen", stat = "count") +
                    theme_minimal()
    
    print(plot)
    # print(plot)
  }
    
  
  
}

auto_factor_plot(factorVars)
## Warning: Ignoring unknown parameters: binwidth, bins, pad

## Warning: Ignoring unknown parameters: binwidth, bins, pad

## Warning: Ignoring unknown parameters: binwidth, bins, pad

## Warning: Ignoring unknown parameters: binwidth, bins, pad

## Warning: Ignoring unknown parameters: binwidth, bins, pad

## Warning: Ignoring unknown parameters: binwidth, bins, pad

## Warning: Ignoring unknown parameters: binwidth, bins, pad

## Warning: Ignoring unknown parameters: binwidth, bins, pad

## Warning: Ignoring unknown parameters: binwidth, bins, pad

## Warning: Ignoring unknown parameters: binwidth, bins, pad

## Warning: Ignoring unknown parameters: binwidth, bins, pad

## Warning: Ignoring unknown parameters: binwidth, bins, pad

## Warning: Ignoring unknown parameters: binwidth, bins, pad

# for(i in :ncol(data)) {                              # Printing ggplot within for-loop
#   print(ggplot(data, aes(x = x, y = data[ , i])) +
#           geom_point())
#   Sys.sleep(2)
# }

# edu_Df %>%
#   count(gender)

Numeric Variables

options(repr.plot.height=4)

## Plot bars with Numeric Labels
auto_numeric_plot <- function(.data) {
  ## Type of Variable
  nm <- names(.data)
  
## loop to plot through
  for (i in seq_along(nm)) {
    plot1 <- .data %>%
              ggplot(aes_string(x = nm[i])) + 
                    geom_histogram(alpha = .5, fill = NA, colour = "mediumseagreen") +
                    theme_minimal()
    
    gridExtra::grid.arrange(plot1)
    # plot2 <- .data %>%
    #             ggplot(aes(x = nm[i])) +
    #               geom_density(fill = "cornflowerblue") + 
    #               labs(title = "Density Distribution",
    #                    y = "Insurance Percentage",
    #                    x = "Distribution")

    # gridExtra::grid.arrange(plot1, plot2)
  }
  
}

auto_numeric_plot(numericVars)
## `stat_bin()` using `bins = 30`. Pick better value with `binwidth`.

## `stat_bin()` using `bins = 30`. Pick better value with `binwidth`.

## `stat_bin()` using `bins = 30`. Pick better value with `binwidth`.

## `stat_bin()` using `bins = 30`. Pick better value with `binwidth`.

BiVariate Relatonship with Outcome Variable

Numeric Variables

library(scales)
## 
## Attaching package: 'scales'
## The following object is masked from 'package:purrr':
## 
##     discard
## The following object is masked from 'package:readr':
## 
##     col_factor
## Plotting Function
bi_numeric_plot <- function(.data, var) {

  plot <- .data %>%
            ggplot(aes(y = factor(Class,
                              labels = c("High\nGrades\n[90-100]",
                                         "Low\nGrades\n[0-69]",
                                         "Middle\nGrades\n[70-89]")), 
                   x = {{var}}, 
                   color = Class)) +
            geom_jitter(alpha = 0.7,
                        size = 1.5) + 
            labs(title = "Student Grades by Class", 
                 subtitle = "BiVariate Relationship with Numeric Variable",
                 x = "",
                 y = "") +
            theme_minimal() +
            theme(legend.position = "none")
  
  print(plot)
}

bi_numeric_plot(edu_Df, raisedhands)

bi_numeric_plot(edu_Df, VisITedResources)

bi_numeric_plot(edu_Df, AnnouncementsView)

bi_numeric_plot(edu_Df, Discussion)

BiVariate Relatonship with Outcome Variable

Factor Variables

# create a summary dataset
library(dplyr)

bi_factor_plot <- function(.data, var){
  plotdata <- .data %>%
  group_by(Class, {{var}}) %>%
  summarize(n = n()) %>% 
  mutate(pct = n/sum(n),
         lbl = scales::percent(pct))

  ggplot(plotdata, 
         aes(x = factor(Class,
                        labels = c("High\nGrades\n[90-100]",
                                   "Low\nGrades\n[0-69]",
                                   "Middle\nGrades\n[70-89]")),
             y = pct,
             fill = factor({{var}},
                           labels = c("Female",
                                      "Male")))) + 
    geom_bar(stat = "identity",
             position = "fill") +
    scale_y_continuous(breaks = seq(0, 1, .2), 
                       label = percent) +
    geom_text(aes(label = lbl), 
              size = 3, 
              position = position_stack(vjust = 0.5)) +
    scale_fill_brewer(palette = "Set2") +
    labs(y = "Percent", 
         fill = "Distribution by Factor Variables",
         x = "Student Grades by Class",
         title = "BiVariate Relationship with Numeric Variable") +
    theme_minimal()
}

bi_factor_plot(edu_Df, gender)
## `summarise()` regrouping output by 'Class' (override with `.groups` argument)

Females Seem/tend to be the brightest in this dataset, however to be a little bit thorough let us examine to just what account is the relationship between variables in our dataset using Correlation.

Correlation Analysis

Correlation Analysis is only possible for Numeric Variables, so we first have to encode our Factor Variables accordingly.

str(factorVars)
## 'data.frame':    480 obs. of  13 variables:
##  $ gender                  : Factor w/ 2 levels "F","M": 2 2 2 2 2 1 2 2 1 1 ...
##  $ NationalITy             : Factor w/ 14 levels "Egypt","Iran",..: 5 5 5 5 5 5 5 5 5 5 ...
##  $ PlaceofBirth            : Factor w/ 14 levels "Egypt","Iran",..: 5 5 5 5 5 5 5 5 5 5 ...
##  $ StageID                 : Factor w/ 3 levels "HighSchool","lowerlevel",..: 2 2 2 2 2 2 3 3 3 3 ...
##  $ GradeID                 : Factor w/ 10 levels "G-02","G-04",..: 2 2 2 2 2 2 5 5 5 5 ...
##  $ SectionID               : Factor w/ 3 levels "A","B","C": 1 1 1 1 1 1 1 1 1 2 ...
##  $ Topic                   : Factor w/ 12 levels "Arabic","Biology",..: 8 8 8 8 8 8 9 9 9 8 ...
##  $ Semester                : Factor w/ 2 levels "F","S": 1 1 1 1 1 1 1 1 1 1 ...
##  $ Relation                : Factor w/ 2 levels "Father","Mum": 1 1 1 1 1 1 1 1 1 1 ...
##  $ ParentAnsweringSurvey   : Factor w/ 2 levels "No","Yes": 2 2 1 1 1 2 1 2 2 2 ...
##  $ ParentschoolSatisfaction: Factor w/ 2 levels "Bad","Good": 2 2 1 1 1 1 1 2 2 2 ...
##  $ StudentAbsenceDays      : Factor w/ 2 levels "Above-7","Under-7": 2 2 1 1 1 1 1 2 2 2 ...
##  $ Class                   : Factor w/ 3 levels "H","L","M": 3 3 2 2 3 3 2 3 3 3 ...
## Dummies
library(caret)
## Loading required package: lattice
## 
## Attaching package: 'caret'
## The following object is masked from 'package:purrr':
## 
##     lift
# dummify the data
dmy <- dummyVars(" ~ .", data = edu_Df)
edu_trsf <- data.frame(predict(dmy, newdata = edu_Df))
dim(edu_trsf)
## [1] 480  75

BiVariate Relationship II: Correlation Analysis

# calulate the correlations
library(kableExtra)
## 
## Attaching package: 'kableExtra'
## The following object is masked from 'package:dplyr':
## 
##     group_rows
crr <- cor(edu_trsf, use="complete.obs")
kable(round(crr,2))
gender.F gender.M NationalITy.Egypt NationalITy.Iran NationalITy.Iraq NationalITy.Jordan NationalITy.KW NationalITy.lebanon NationalITy.Lybia NationalITy.Morocco NationalITy.Palestine NationalITy.SaudiArabia NationalITy.Syria NationalITy.Tunis NationalITy.USA NationalITy.venzuela PlaceofBirth.Egypt PlaceofBirth.Iran PlaceofBirth.Iraq PlaceofBirth.Jordan PlaceofBirth.KuwaIT PlaceofBirth.lebanon PlaceofBirth.Lybia PlaceofBirth.Morocco PlaceofBirth.Palestine PlaceofBirth.SaudiArabia PlaceofBirth.Syria PlaceofBirth.Tunis PlaceofBirth.USA PlaceofBirth.venzuela StageID.HighSchool StageID.lowerlevel StageID.MiddleSchool GradeID.G.02 GradeID.G.04 GradeID.G.05 GradeID.G.06 GradeID.G.07 GradeID.G.08 GradeID.G.09 GradeID.G.10 GradeID.G.11 GradeID.G.12 SectionID.A SectionID.B SectionID.C Topic.Arabic Topic.Biology Topic.Chemistry Topic.English Topic.French Topic.Geology Topic.History Topic.IT Topic.Math Topic.Quran Topic.Science Topic.Spanish Semester.F Semester.S Relation.Father Relation.Mum raisedhands VisITedResources AnnouncementsView Discussion ParentAnsweringSurvey.No ParentAnsweringSurvey.Yes ParentschoolSatisfaction.Bad ParentschoolSatisfaction.Good StudentAbsenceDays.Above.7 StudentAbsenceDays.Under.7 Class.H Class.L Class.M
gender.F 1.00 -1.00 -0.04 -0.05 -0.04 0.15 -0.10 0.11 -0.01 -0.02 -0.04 0.00 -0.02 -0.09 0.07 -0.03 -0.01 -0.05 -0.04 0.12 -0.11 0.16 -0.01 -0.02 0.01 -0.07 -0.01 -0.10 0.08 -0.03 0.05 0.05 -0.07 0.02 0.04 -0.01 0.06 -0.05 -0.06 0.01 -0.07 0.01 0.12 0.04 -0.02 -0.05 -0.07 -0.02 0.06 0.04 0.08 0.02 0.02 -0.03 -0.06 0.02 0.06 -0.16 0.05 -0.05 -0.20 0.20 0.15 0.21 0.05 0.12 -0.02 0.02 -0.09 0.09 -0.21 0.21 0.22 -0.22 -0.01
gender.M -1.00 1.00 0.04 0.05 0.04 -0.15 0.10 -0.11 0.01 0.02 0.04 0.00 0.02 0.09 -0.07 0.03 0.01 0.05 0.04 -0.12 0.11 -0.16 0.01 0.02 -0.01 0.07 0.01 0.10 -0.08 0.03 -0.05 -0.05 0.07 -0.02 -0.04 0.01 -0.06 0.05 0.06 -0.01 0.07 -0.01 -0.12 -0.04 0.02 0.05 0.07 0.02 -0.06 -0.04 -0.08 -0.02 -0.02 0.03 0.06 -0.02 -0.06 0.16 -0.05 0.05 0.20 -0.20 -0.15 -0.21 -0.05 -0.12 0.02 -0.02 0.09 -0.09 0.21 -0.21 -0.22 0.22 0.01
NationalITy.Egypt -0.04 0.04 1.00 -0.02 -0.03 -0.10 -0.11 -0.03 -0.02 -0.01 -0.03 -0.02 -0.02 -0.02 -0.02 -0.01 0.89 -0.02 -0.03 -0.11 -0.08 -0.03 -0.02 -0.01 -0.02 -0.03 -0.02 -0.02 -0.03 -0.01 -0.04 0.01 0.01 -0.03 0.06 -0.01 -0.04 0.12 -0.08 -0.01 -0.01 -0.02 -0.02 -0.04 0.06 -0.04 -0.05 -0.04 -0.03 0.01 0.04 -0.03 -0.03 -0.03 0.05 0.04 0.10 -0.03 -0.08 0.08 -0.07 0.07 -0.02 0.01 0.03 0.01 0.03 -0.03 -0.05 0.05 0.04 -0.04 -0.02 0.02 0.00
NationalITy.Iran -0.05 0.05 -0.02 1.00 -0.02 -0.08 -0.09 -0.02 -0.01 -0.01 -0.03 -0.02 -0.01 -0.02 -0.01 -0.01 -0.02 1.00 -0.02 -0.09 -0.09 -0.02 -0.01 -0.01 -0.02 -0.02 -0.01 -0.02 -0.02 -0.01 0.04 0.02 -0.04 0.05 -0.04 -0.01 -0.03 -0.06 0.02 0.17 -0.01 -0.02 -0.02 -0.06 0.00 0.13 -0.04 -0.03 -0.03 -0.04 0.07 -0.03 -0.02 0.04 -0.02 -0.02 -0.04 0.14 -0.04 0.04 -0.06 0.06 -0.09 -0.08 -0.05 0.00 0.01 -0.01 0.02 -0.02 0.06 -0.06 -0.07 0.02 0.05
NationalITy.Iraq -0.04 0.04 -0.03 -0.02 1.00 -0.16 -0.17 -0.04 -0.02 -0.02 -0.05 -0.03 -0.03 -0.04 -0.02 -0.01 -0.03 -0.02 1.00 -0.17 -0.17 -0.04 -0.02 -0.02 -0.03 -0.04 -0.02 -0.03 -0.04 -0.01 -0.06 0.02 0.01 0.03 -0.01 -0.02 0.02 -0.02 0.02 -0.02 -0.02 -0.04 -0.03 0.02 0.01 -0.06 0.10 0.11 0.04 0.00 -0.03 0.04 0.06 -0.11 -0.05 -0.05 -0.01 -0.05 0.00 0.00 0.02 -0.02 0.19 0.19 0.15 0.06 -0.11 0.11 -0.18 0.18 -0.06 0.06 0.16 -0.13 -0.03
NationalITy.Jordan 0.15 -0.15 -0.10 -0.08 -0.16 1.00 -0.58 -0.14 -0.08 -0.07 -0.19 -0.11 -0.09 -0.12 -0.08 -0.03 -0.07 -0.08 -0.16 0.80 -0.57 -0.08 -0.08 -0.07 0.01 0.08 -0.08 -0.10 -0.09 -0.03 -0.20 0.04 0.06 0.02 0.04 0.00 0.08 -0.10 0.12 -0.08 -0.07 -0.12 -0.11 0.15 -0.08 -0.14 0.00 0.09 0.27 0.01 0.12 0.23 0.03 -0.33 -0.16 -0.06 0.08 -0.14 -0.04 0.04 -0.20 0.20 0.05 0.19 0.13 -0.01 0.04 -0.04 -0.01 0.01 0.04 -0.04 0.02 -0.08 0.06
NationalITy.KW -0.10 0.10 -0.11 -0.09 -0.17 -0.58 1.00 -0.15 -0.09 -0.07 -0.19 -0.12 -0.09 -0.12 -0.09 -0.04 -0.11 -0.09 -0.17 -0.59 0.98 -0.16 -0.09 -0.07 -0.11 -0.14 -0.09 -0.11 -0.10 -0.04 0.15 0.00 -0.07 -0.04 0.03 0.05 -0.10 0.07 -0.08 0.09 0.07 0.00 0.14 -0.08 0.01 0.16 -0.03 -0.20 -0.18 -0.03 -0.24 -0.18 0.00 0.50 0.15 0.00 -0.08 0.09 0.18 -0.18 0.29 -0.29 -0.26 -0.33 -0.32 0.02 0.05 -0.05 0.18 -0.18 0.08 -0.08 -0.16 0.20 -0.03
NationalITy.lebanon 0.11 -0.11 -0.03 -0.02 -0.04 -0.14 -0.15 1.00 -0.02 -0.02 -0.05 -0.03 -0.02 -0.03 -0.02 -0.01 -0.03 -0.02 -0.04 -0.12 -0.15 0.89 -0.02 -0.02 -0.03 -0.04 -0.02 -0.03 -0.04 -0.01 -0.05 -0.05 0.07 -0.01 -0.06 -0.02 0.04 -0.02 0.08 -0.02 -0.02 -0.03 -0.03 -0.02 0.00 0.04 0.07 -0.05 -0.04 0.02 0.06 -0.04 -0.04 -0.07 0.07 0.07 -0.07 0.06 -0.08 0.08 -0.09 0.09 0.10 0.05 0.04 -0.07 -0.03 0.03 0.01 -0.01 -0.11 0.11 0.10 -0.06 -0.03
NationalITy.Lybia -0.01 0.01 -0.02 -0.01 -0.02 -0.08 -0.09 -0.02 1.00 -0.01 -0.03 -0.02 -0.01 -0.02 -0.01 -0.01 -0.02 -0.01 -0.02 -0.09 -0.09 -0.02 1.00 -0.01 -0.02 -0.02 -0.01 -0.02 -0.02 -0.01 -0.03 0.06 -0.04 0.09 -0.04 -0.01 -0.03 0.03 -0.06 -0.01 -0.01 -0.02 -0.02 -0.06 0.08 -0.03 -0.04 0.13 -0.03 -0.04 0.17 -0.03 -0.02 -0.06 -0.02 -0.02 -0.04 -0.03 0.00 0.00 -0.13 0.13 -0.12 -0.17 -0.12 -0.16 0.13 -0.13 -0.09 0.09 0.14 -0.14 -0.07 0.19 -0.10
NationalITy.Morocco -0.02 0.02 -0.01 -0.01 -0.02 -0.07 -0.07 -0.02 -0.01 1.00 -0.02 -0.01 -0.01 -0.01 -0.01 0.00 -0.01 -0.01 -0.02 -0.07 -0.07 -0.02 -0.01 1.00 -0.01 -0.02 -0.01 -0.01 -0.02 0.00 -0.02 -0.03 0.04 -0.01 -0.03 -0.01 -0.02 -0.05 0.11 -0.01 -0.01 -0.02 -0.01 -0.02 0.03 -0.02 0.18 -0.02 -0.02 -0.03 0.03 -0.02 -0.02 -0.05 -0.02 -0.02 -0.03 -0.02 -0.09 0.09 -0.06 0.06 0.03 0.01 0.08 0.02 0.06 -0.06 0.07 -0.07 -0.03 0.03 -0.01 0.00 0.01
NationalITy.Palestine -0.04 0.04 -0.03 -0.03 -0.05 -0.19 -0.19 -0.05 -0.03 -0.02 1.00 -0.04 -0.03 -0.04 -0.03 -0.01 -0.03 -0.03 -0.05 0.22 -0.19 -0.05 -0.03 -0.02 0.34 -0.05 -0.03 -0.03 -0.05 -0.01 -0.07 0.01 0.03 -0.01 0.04 -0.02 0.15 0.00 -0.06 -0.03 -0.02 -0.04 -0.04 0.06 -0.03 -0.06 0.02 0.16 -0.06 0.10 0.01 0.02 0.04 -0.12 -0.05 -0.05 0.03 -0.06 -0.01 0.01 -0.05 0.05 0.28 0.16 0.20 0.09 -0.08 0.08 -0.20 0.20 -0.17 0.17 0.07 -0.15 0.07
NationalITy.SaudiArabia 0.00 0.00 -0.02 -0.02 -0.03 -0.11 -0.12 -0.03 -0.02 -0.01 -0.04 1.00 -0.02 -0.02 -0.02 -0.01 -0.02 -0.02 -0.03 -0.12 -0.12 -0.03 -0.02 -0.01 -0.02 0.44 -0.02 -0.02 0.36 -0.01 0.29 -0.04 -0.10 -0.01 -0.05 -0.01 -0.04 -0.04 -0.05 -0.02 -0.01 0.49 -0.02 -0.13 0.15 -0.04 -0.01 -0.04 -0.04 0.00 -0.02 -0.04 -0.03 -0.01 0.04 0.03 0.08 0.03 -0.07 0.07 0.10 -0.10 0.04 0.01 0.07 0.06 -0.05 0.05 0.08 -0.08 -0.01 0.01 0.08 -0.06 -0.02
NationalITy.Syria -0.02 0.02 -0.02 -0.01 -0.03 -0.09 -0.09 -0.02 -0.01 -0.01 -0.03 -0.02 1.00 -0.02 -0.01 -0.01 -0.02 -0.01 -0.03 -0.06 -0.09 -0.02 -0.01 -0.01 -0.02 -0.02 0.92 -0.02 -0.02 -0.01 -0.03 0.00 0.01 0.03 -0.04 -0.01 -0.03 0.07 -0.03 -0.01 -0.01 -0.02 -0.02 0.07 -0.05 -0.03 -0.05 0.11 -0.03 -0.04 0.10 -0.03 -0.02 -0.06 -0.03 0.06 -0.04 0.05 -0.02 0.02 0.00 0.00 -0.03 -0.01 0.00 0.01 -0.04 0.04 -0.03 0.03 0.01 -0.01 0.00 0.01 0.00
NationalITy.Tunis -0.09 0.09 -0.02 -0.02 -0.04 -0.12 -0.12 -0.03 -0.02 -0.01 -0.04 -0.02 -0.02 1.00 -0.02 -0.01 -0.02 -0.02 -0.04 -0.12 -0.10 -0.03 -0.02 -0.01 -0.02 0.04 -0.02 0.86 0.04 -0.01 0.06 -0.08 0.05 -0.05 -0.05 -0.01 -0.04 0.08 0.00 -0.02 -0.01 0.14 -0.02 -0.08 0.02 0.12 -0.06 -0.04 -0.04 -0.05 0.05 -0.04 -0.03 -0.08 -0.03 0.22 0.03 0.14 -0.14 0.14 0.03 -0.03 -0.01 0.04 0.02 -0.12 -0.01 0.01 0.06 -0.06 -0.02 0.02 -0.02 0.02 -0.01
NationalITy.USA 0.07 -0.07 -0.02 -0.01 -0.02 -0.08 -0.09 -0.02 -0.01 -0.01 -0.03 -0.02 -0.01 -0.02 1.00 -0.01 -0.02 -0.01 -0.02 -0.09 -0.09 -0.02 -0.01 -0.01 -0.02 -0.02 -0.01 -0.02 0.61 -0.01 0.12 -0.02 -0.04 0.01 -0.04 -0.01 -0.03 -0.01 -0.02 -0.01 -0.01 -0.02 0.23 -0.02 0.04 -0.03 -0.04 -0.03 -0.03 0.03 0.01 -0.03 -0.02 0.04 0.16 -0.02 -0.04 -0.03 0.07 -0.07 -0.02 0.02 -0.02 -0.01 -0.01 -0.04 -0.06 0.06 -0.05 0.05 -0.05 0.05 0.05 -0.02 -0.02
NationalITy.venzuela -0.03 0.03 -0.01 -0.01 -0.01 -0.03 -0.04 -0.01 -0.01 0.00 -0.01 -0.01 -0.01 -0.01 -0.01 1.00 -0.01 -0.01 -0.01 -0.03 -0.04 -0.01 -0.01 0.00 -0.01 -0.01 -0.01 -0.01 -0.01 1.00 0.17 -0.04 -0.05 -0.03 -0.02 0.00 -0.01 -0.02 -0.03 0.00 0.50 -0.01 -0.01 0.04 -0.03 -0.01 -0.02 -0.01 -0.01 -0.01 -0.02 -0.01 -0.01 0.09 -0.01 -0.01 -0.02 -0.01 0.04 -0.04 -0.05 0.05 0.05 0.05 0.06 0.06 -0.04 0.04 -0.04 0.04 -0.04 0.04 0.07 -0.03 -0.04
PlaceofBirth.Egypt -0.01 0.01 0.89 -0.02 -0.03 -0.07 -0.11 -0.03 -0.02 -0.01 -0.03 -0.02 -0.02 -0.02 -0.02 -0.01 1.00 -0.02 -0.03 -0.11 -0.11 -0.03 -0.02 -0.01 -0.02 -0.03 -0.02 -0.02 -0.03 -0.01 -0.04 0.01 0.01 -0.03 0.06 -0.01 -0.04 0.12 -0.08 -0.01 -0.01 -0.02 -0.02 -0.01 0.03 -0.04 -0.05 -0.04 -0.03 0.01 0.04 -0.03 -0.03 -0.03 0.05 0.12 0.05 -0.03 -0.05 0.05 -0.10 0.10 0.02 0.03 0.06 0.03 0.03 -0.03 -0.05 0.05 0.01 -0.01 0.01 0.02 -0.03
PlaceofBirth.Iran -0.05 0.05 -0.02 1.00 -0.02 -0.08 -0.09 -0.02 -0.01 -0.01 -0.03 -0.02 -0.01 -0.02 -0.01 -0.01 -0.02 1.00 -0.02 -0.09 -0.09 -0.02 -0.01 -0.01 -0.02 -0.02 -0.01 -0.02 -0.02 -0.01 0.04 0.02 -0.04 0.05 -0.04 -0.01 -0.03 -0.06 0.02 0.17 -0.01 -0.02 -0.02 -0.06 0.00 0.13 -0.04 -0.03 -0.03 -0.04 0.07 -0.03 -0.02 0.04 -0.02 -0.02 -0.04 0.14 -0.04 0.04 -0.06 0.06 -0.09 -0.08 -0.05 0.00 0.01 -0.01 0.02 -0.02 0.06 -0.06 -0.07 0.02 0.05
PlaceofBirth.Iraq -0.04 0.04 -0.03 -0.02 1.00 -0.16 -0.17 -0.04 -0.02 -0.02 -0.05 -0.03 -0.03 -0.04 -0.02 -0.01 -0.03 -0.02 1.00 -0.17 -0.17 -0.04 -0.02 -0.02 -0.03 -0.04 -0.02 -0.03 -0.04 -0.01 -0.06 0.02 0.01 0.03 -0.01 -0.02 0.02 -0.02 0.02 -0.02 -0.02 -0.04 -0.03 0.02 0.01 -0.06 0.10 0.11 0.04 0.00 -0.03 0.04 0.06 -0.11 -0.05 -0.05 -0.01 -0.05 0.00 0.00 0.02 -0.02 0.19 0.19 0.15 0.06 -0.11 0.11 -0.18 0.18 -0.06 0.06 0.16 -0.13 -0.03
PlaceofBirth.Jordan 0.12 -0.12 -0.11 -0.09 -0.17 0.80 -0.59 -0.12 -0.09 -0.07 0.22 -0.12 -0.06 -0.12 -0.09 -0.03 -0.11 -0.09 -0.17 1.00 -0.59 -0.15 -0.09 -0.07 -0.11 -0.14 -0.09 -0.11 -0.14 -0.03 -0.21 0.05 0.05 0.04 0.03 -0.01 0.18 -0.12 0.07 -0.08 -0.07 -0.13 -0.12 0.15 -0.07 -0.18 0.03 0.13 0.22 0.10 0.13 0.14 0.07 -0.33 -0.16 -0.13 0.07 -0.16 -0.04 0.04 -0.18 0.18 0.11 0.20 0.14 -0.05 0.00 0.00 -0.11 0.11 0.01 -0.01 0.01 -0.12 0.10
PlaceofBirth.KuwaIT -0.11 0.11 -0.08 -0.09 -0.17 -0.57 0.98 -0.15 -0.09 -0.07 -0.19 -0.12 -0.09 -0.10 -0.09 -0.04 -0.11 -0.09 -0.17 -0.59 1.00 -0.16 -0.09 -0.07 -0.11 -0.14 -0.09 -0.11 -0.14 -0.04 0.11 -0.01 -0.05 -0.04 0.03 0.05 -0.10 0.09 -0.08 0.09 0.07 -0.05 0.14 -0.11 0.02 0.17 -0.03 -0.20 -0.18 -0.03 -0.24 -0.18 0.00 0.50 0.15 -0.05 -0.06 0.11 0.16 -0.16 0.31 -0.31 -0.27 -0.34 -0.33 0.01 0.05 -0.05 0.18 -0.18 0.09 -0.09 -0.17 0.21 -0.03
PlaceofBirth.lebanon 0.16 -0.16 -0.03 -0.02 -0.04 -0.08 -0.16 0.89 -0.02 -0.02 -0.05 -0.03 -0.02 -0.03 -0.02 -0.01 -0.03 -0.02 -0.04 -0.15 -0.16 1.00 -0.02 -0.02 -0.03 -0.04 -0.02 -0.03 -0.04 -0.01 -0.06 -0.02 0.05 -0.02 0.00 -0.02 0.03 0.00 0.04 -0.02 -0.02 -0.03 -0.03 -0.05 0.03 0.04 0.02 -0.05 -0.05 0.01 0.04 -0.05 -0.04 -0.07 0.06 0.11 0.00 0.05 -0.08 0.08 -0.11 0.11 0.11 0.07 0.06 -0.02 -0.05 0.05 0.01 -0.01 -0.12 0.12 0.13 -0.07 -0.05
PlaceofBirth.Lybia -0.01 0.01 -0.02 -0.01 -0.02 -0.08 -0.09 -0.02 1.00 -0.01 -0.03 -0.02 -0.01 -0.02 -0.01 -0.01 -0.02 -0.01 -0.02 -0.09 -0.09 -0.02 1.00 -0.01 -0.02 -0.02 -0.01 -0.02 -0.02 -0.01 -0.03 0.06 -0.04 0.09 -0.04 -0.01 -0.03 0.03 -0.06 -0.01 -0.01 -0.02 -0.02 -0.06 0.08 -0.03 -0.04 0.13 -0.03 -0.04 0.17 -0.03 -0.02 -0.06 -0.02 -0.02 -0.04 -0.03 0.00 0.00 -0.13 0.13 -0.12 -0.17 -0.12 -0.16 0.13 -0.13 -0.09 0.09 0.14 -0.14 -0.07 0.19 -0.10
PlaceofBirth.Morocco -0.02 0.02 -0.01 -0.01 -0.02 -0.07 -0.07 -0.02 -0.01 1.00 -0.02 -0.01 -0.01 -0.01 -0.01 0.00 -0.01 -0.01 -0.02 -0.07 -0.07 -0.02 -0.01 1.00 -0.01 -0.02 -0.01 -0.01 -0.02 0.00 -0.02 -0.03 0.04 -0.01 -0.03 -0.01 -0.02 -0.05 0.11 -0.01 -0.01 -0.02 -0.01 -0.02 0.03 -0.02 0.18 -0.02 -0.02 -0.03 0.03 -0.02 -0.02 -0.05 -0.02 -0.02 -0.03 -0.02 -0.09 0.09 -0.06 0.06 0.03 0.01 0.08 0.02 0.06 -0.06 0.07 -0.07 -0.03 0.03 -0.01 0.00 0.01
PlaceofBirth.Palestine 0.01 -0.01 -0.02 -0.02 -0.03 0.01 -0.11 -0.03 -0.02 -0.01 0.34 -0.02 -0.02 -0.02 -0.02 -0.01 -0.02 -0.02 -0.03 -0.11 -0.11 -0.03 -0.02 -0.01 1.00 -0.03 -0.02 -0.02 -0.03 -0.01 -0.04 0.00 0.02 -0.03 0.05 -0.01 -0.04 0.07 -0.01 -0.01 -0.01 -0.02 -0.02 0.12 -0.11 -0.04 -0.05 0.20 -0.03 -0.05 0.03 0.10 -0.03 -0.07 -0.03 -0.03 0.04 -0.03 0.00 0.00 -0.06 0.06 0.16 0.14 0.19 0.16 -0.13 0.13 -0.12 0.12 -0.12 0.12 0.10 -0.09 -0.01
PlaceofBirth.SaudiArabia -0.07 0.07 -0.03 -0.02 -0.04 0.08 -0.14 -0.04 -0.02 -0.02 -0.05 0.44 -0.02 0.04 -0.02 -0.01 -0.03 -0.02 -0.04 -0.14 -0.14 -0.04 -0.02 -0.02 -0.03 1.00 -0.02 -0.03 -0.03 -0.01 0.00 -0.04 0.04 0.00 -0.06 -0.01 -0.05 -0.04 0.11 -0.02 -0.02 0.04 -0.03 -0.03 0.03 0.00 0.04 -0.05 0.06 -0.06 -0.04 0.17 -0.04 -0.03 -0.04 0.07 -0.03 0.01 -0.03 0.03 0.06 -0.06 0.02 -0.01 -0.01 0.02 0.05 -0.05 0.09 -0.09 -0.01 0.01 0.06 -0.01 -0.05
PlaceofBirth.Syria -0.01 0.01 -0.02 -0.01 -0.02 -0.08 -0.09 -0.02 -0.01 -0.01 -0.03 -0.02 0.92 -0.02 -0.01 -0.01 -0.02 -0.01 -0.02 -0.09 -0.09 -0.02 -0.01 -0.01 -0.02 -0.02 1.00 -0.02 -0.02 -0.01 -0.03 0.02 0.00 0.05 -0.04 -0.01 -0.03 0.08 -0.06 -0.01 -0.01 -0.02 -0.02 0.06 -0.04 -0.03 -0.04 0.13 -0.03 -0.04 0.12 -0.03 -0.02 -0.06 -0.02 0.07 -0.04 -0.03 0.00 0.00 -0.02 0.02 -0.01 0.02 0.01 0.02 -0.02 0.02 -0.01 0.01 -0.01 0.01 0.01 -0.02 0.01
PlaceofBirth.Tunis -0.10 0.10 -0.02 -0.02 -0.03 -0.10 -0.11 -0.03 -0.02 -0.01 -0.03 -0.02 -0.02 0.86 -0.02 -0.01 -0.02 -0.02 -0.03 -0.11 -0.11 -0.03 -0.02 -0.01 -0.02 -0.03 -0.02 1.00 -0.03 -0.01 0.02 -0.05 0.04 -0.03 -0.05 -0.01 -0.04 0.04 0.03 -0.01 -0.01 0.07 -0.02 -0.07 0.00 0.15 -0.05 -0.04 -0.03 -0.04 0.04 -0.03 -0.03 -0.07 -0.03 0.19 0.00 0.17 -0.11 0.11 -0.01 0.01 -0.03 0.04 0.01 -0.10 0.00 0.00 0.05 -0.05 -0.02 0.02 0.01 0.02 -0.03
PlaceofBirth.USA 0.08 -0.08 -0.03 -0.02 -0.04 -0.09 -0.10 -0.04 -0.02 -0.02 -0.05 0.36 -0.02 0.04 0.61 -0.01 -0.03 -0.02 -0.04 -0.14 -0.14 -0.04 -0.02 -0.02 -0.03 -0.03 -0.02 -0.03 1.00 -0.01 0.41 -0.09 -0.12 -0.05 -0.06 -0.01 -0.05 -0.04 -0.08 -0.02 -0.02 0.54 0.13 -0.06 0.08 -0.05 -0.07 -0.05 -0.04 0.02 0.03 -0.04 -0.04 -0.03 0.13 0.13 0.01 0.01 -0.03 0.03 -0.01 0.01 0.05 0.04 0.12 0.03 -0.02 0.02 0.04 -0.04 -0.06 0.06 0.03 -0.06 0.02
PlaceofBirth.venzuela -0.03 0.03 -0.01 -0.01 -0.01 -0.03 -0.04 -0.01 -0.01 0.00 -0.01 -0.01 -0.01 -0.01 -0.01 1.00 -0.01 -0.01 -0.01 -0.03 -0.04 -0.01 -0.01 0.00 -0.01 -0.01 -0.01 -0.01 -0.01 1.00 0.17 -0.04 -0.05 -0.03 -0.02 0.00 -0.01 -0.02 -0.03 0.00 0.50 -0.01 -0.01 0.04 -0.03 -0.01 -0.02 -0.01 -0.01 -0.01 -0.02 -0.01 -0.01 0.09 -0.01 -0.01 -0.02 -0.01 0.04 -0.04 -0.05 0.05 0.05 0.05 0.06 0.06 -0.04 0.04 -0.04 0.04 -0.04 0.04 0.07 -0.03 -0.04
StageID.HighSchool 0.05 -0.05 -0.04 0.04 -0.06 -0.20 0.15 -0.05 -0.03 -0.02 -0.07 0.29 -0.03 0.06 0.12 0.17 -0.04 0.04 -0.06 -0.21 0.11 -0.06 -0.03 -0.02 -0.04 0.00 -0.03 0.02 0.41 0.17 1.00 -0.23 -0.28 -0.18 -0.09 -0.02 -0.07 -0.14 -0.15 0.38 0.34 0.61 0.56 0.11 -0.08 -0.07 -0.10 -0.07 -0.06 0.22 -0.08 -0.06 -0.06 0.07 0.02 0.10 0.01 -0.03 0.10 -0.10 0.04 -0.04 -0.03 -0.03 -0.01 0.10 -0.02 0.02 0.02 -0.02 -0.04 0.04 0.02 -0.01 -0.01
StageID.lowerlevel 0.05 -0.05 0.01 0.02 0.02 0.04 0.00 -0.05 0.06 -0.03 0.01 -0.04 0.00 -0.08 -0.02 -0.04 0.01 0.02 0.02 0.05 -0.01 -0.02 0.06 -0.03 0.00 -0.04 0.02 -0.05 -0.09 -0.04 -0.23 1.00 -0.87 0.79 0.40 0.09 -0.22 -0.42 -0.48 -0.09 -0.08 -0.14 -0.13 -0.36 0.34 0.04 0.08 -0.22 -0.19 -0.18 0.46 -0.19 -0.02 0.24 -0.14 -0.18 0.08 -0.20 0.09 -0.09 -0.02 0.02 -0.23 -0.10 -0.21 -0.15 0.13 -0.13 -0.01 0.01 0.12 -0.12 -0.04 0.12 -0.07
StageID.MiddleSchool -0.07 0.07 0.01 -0.04 0.01 0.06 -0.07 0.07 -0.04 0.04 0.03 -0.10 0.01 0.05 -0.04 -0.05 0.01 -0.04 0.01 0.05 -0.05 0.05 -0.04 0.04 0.02 0.04 0.00 0.04 -0.12 -0.05 -0.28 -0.87 1.00 -0.69 -0.34 -0.08 0.26 0.49 0.55 -0.11 -0.09 -0.17 -0.16 0.29 -0.30 -0.01 -0.03 0.25 0.22 0.07 -0.41 0.22 0.05 -0.27 0.13 0.13 -0.09 0.21 -0.14 0.14 0.00 0.00 0.24 0.12 0.21 0.10 -0.11 0.11 0.00 0.00 -0.10 0.10 0.02 -0.11 0.08
GradeID.G.02 0.02 -0.02 -0.03 0.05 0.03 0.02 -0.04 -0.01 0.09 -0.01 -0.01 -0.01 0.03 -0.05 0.01 -0.03 -0.03 0.05 0.03 0.04 -0.04 -0.02 0.09 -0.01 -0.03 0.00 0.05 -0.03 -0.05 -0.03 -0.18 0.79 -0.69 1.00 -0.22 -0.05 -0.18 -0.34 -0.38 -0.07 -0.06 -0.11 -0.10 -0.45 0.41 0.11 0.16 -0.17 -0.15 -0.21 0.58 -0.15 -0.13 0.27 -0.14 -0.15 -0.23 -0.16 0.12 -0.12 -0.03 0.03 -0.22 -0.07 -0.24 -0.21 0.09 -0.09 -0.01 0.01 0.05 -0.05 -0.02 0.11 -0.08
GradeID.G.04 0.04 -0.04 0.06 -0.04 -0.01 0.04 0.03 -0.06 -0.04 -0.03 0.04 -0.05 -0.04 -0.05 -0.04 -0.02 0.06 -0.04 -0.01 0.03 0.03 0.00 -0.04 -0.03 0.05 -0.06 -0.04 -0.05 -0.06 -0.02 -0.09 0.40 -0.34 -0.22 1.00 -0.03 -0.09 -0.17 -0.19 -0.03 -0.03 -0.06 -0.05 0.08 -0.04 -0.09 -0.10 -0.09 -0.08 -0.04 -0.13 -0.08 0.18 -0.03 0.00 -0.07 0.49 -0.08 -0.06 0.06 0.01 -0.01 0.00 -0.03 0.07 0.09 0.06 -0.06 0.00 0.00 0.08 -0.08 0.00 -0.03 0.03
GradeID.G.05 -0.01 0.01 -0.01 -0.01 -0.02 0.00 0.05 -0.02 -0.01 -0.01 -0.02 -0.01 -0.01 -0.01 -0.01 0.00 -0.01 -0.01 -0.02 -0.01 0.05 -0.02 -0.01 -0.01 -0.01 -0.01 -0.01 -0.01 -0.01 0.00 -0.02 0.09 -0.08 -0.05 -0.03 1.00 -0.02 -0.04 -0.04 -0.01 -0.01 -0.01 -0.01 0.07 -0.06 -0.02 -0.03 -0.02 -0.02 0.25 -0.03 -0.02 -0.02 -0.04 -0.02 -0.02 -0.03 -0.02 0.08 -0.08 0.01 -0.01 -0.09 -0.10 -0.08 -0.04 0.09 -0.09 0.04 -0.04 0.10 -0.10 -0.05 0.13 -0.07
GradeID.G.06 0.06 -0.06 -0.04 -0.03 0.02 0.08 -0.10 0.04 -0.03 -0.02 0.15 -0.04 -0.03 -0.04 -0.03 -0.01 -0.04 -0.03 0.02 0.18 -0.10 0.03 -0.03 -0.02 -0.04 -0.05 -0.03 -0.04 -0.05 -0.01 -0.07 -0.22 0.26 -0.18 -0.09 -0.02 1.00 -0.14 -0.15 -0.03 -0.02 -0.04 -0.04 0.22 -0.20 -0.07 -0.10 -0.07 -0.06 0.66 -0.11 -0.06 -0.05 -0.07 -0.02 -0.02 -0.07 -0.06 -0.02 0.02 -0.08 0.08 0.13 0.00 0.09 0.02 0.03 -0.03 -0.01 0.01 -0.06 0.06 0.08 -0.12 0.03
GradeID.G.07 -0.05 0.05 0.12 -0.06 -0.02 -0.10 0.07 -0.02 0.03 -0.05 0.00 -0.04 0.07 0.08 -0.01 -0.02 0.12 -0.06 -0.02 -0.12 0.09 0.00 0.03 -0.05 0.07 -0.04 0.08 0.04 -0.04 -0.02 -0.14 -0.42 0.49 -0.34 -0.17 -0.04 -0.14 1.00 -0.29 -0.05 -0.05 -0.09 -0.08 0.02 0.05 -0.13 -0.19 0.50 -0.12 -0.13 -0.20 -0.12 -0.10 0.01 0.21 0.30 0.12 -0.12 0.08 -0.08 0.10 -0.10 0.02 -0.02 0.00 0.10 -0.04 0.04 0.00 0.00 -0.01 0.01 -0.01 0.01 0.00
GradeID.G.08 -0.06 0.06 -0.08 0.02 0.02 0.12 -0.08 0.08 -0.06 0.11 -0.06 -0.05 -0.03 0.00 -0.02 -0.03 -0.08 0.02 0.02 0.07 -0.08 0.04 -0.06 0.11 -0.01 0.11 -0.06 0.03 -0.08 -0.03 -0.15 -0.48 0.55 -0.38 -0.19 -0.04 -0.15 -0.29 1.00 -0.06 -0.05 -0.09 -0.09 0.20 -0.29 0.16 0.20 -0.15 0.41 -0.18 -0.22 0.41 0.18 -0.28 -0.05 -0.12 -0.18 0.39 -0.22 0.22 -0.04 0.04 0.18 0.15 0.19 0.01 -0.12 0.12 0.00 0.00 -0.06 0.06 -0.01 -0.06 0.07
GradeID.G.09 0.01 -0.01 -0.01 0.17 -0.02 -0.08 0.09 -0.02 -0.01 -0.01 -0.03 -0.02 -0.01 -0.02 -0.01 0.00 -0.01 0.17 -0.02 -0.08 0.09 -0.02 -0.01 -0.01 -0.01 -0.02 -0.01 -0.01 -0.02 0.00 0.38 -0.09 -0.11 -0.07 -0.03 -0.01 -0.03 -0.05 -0.06 1.00 -0.01 -0.02 -0.02 0.09 -0.07 -0.03 -0.04 -0.03 -0.02 -0.03 -0.04 -0.02 -0.02 0.21 -0.02 -0.02 -0.04 -0.02 0.10 -0.10 0.04 -0.04 -0.08 -0.03 -0.04 0.05 -0.05 0.05 -0.04 0.04 -0.04 0.04 -0.07 -0.02 0.07
GradeID.G.10 -0.07 0.07 -0.01 -0.01 -0.02 -0.07 0.07 -0.02 -0.01 -0.01 -0.02 -0.01 -0.01 -0.01 -0.01 0.50 -0.01 -0.01 -0.02 -0.07 0.07 -0.02 -0.01 -0.01 -0.01 -0.02 -0.01 -0.01 -0.02 0.50 0.34 -0.08 -0.09 -0.06 -0.03 -0.01 -0.02 -0.05 -0.05 -0.01 1.00 -0.02 -0.01 0.08 -0.07 -0.02 -0.03 -0.02 -0.02 -0.03 -0.04 -0.02 -0.02 0.18 -0.02 -0.02 -0.03 -0.02 0.09 -0.09 0.03 -0.03 -0.03 -0.03 -0.02 -0.03 -0.03 0.03 0.02 -0.02 -0.03 0.03 -0.01 0.00 0.01
GradeID.G.11 0.01 -0.01 -0.02 -0.02 -0.04 -0.12 0.00 -0.03 -0.02 -0.02 -0.04 0.49 -0.02 0.14 -0.02 -0.01 -0.02 -0.02 -0.04 -0.13 -0.05 -0.03 -0.02 -0.02 -0.02 0.04 -0.02 0.07 0.54 -0.01 0.61 -0.14 -0.17 -0.11 -0.06 -0.01 -0.04 -0.09 -0.09 -0.02 -0.02 1.00 -0.03 -0.04 0.07 -0.04 -0.06 -0.04 -0.04 -0.01 -0.03 -0.04 -0.03 -0.08 0.09 0.21 0.11 0.02 -0.09 0.09 0.03 -0.03 0.06 0.04 0.09 0.07 -0.02 0.02 0.02 -0.02 -0.03 0.03 0.06 -0.04 -0.02
GradeID.G.12 0.12 -0.12 -0.02 -0.02 -0.03 -0.11 0.14 -0.03 -0.02 -0.01 -0.04 -0.02 -0.02 -0.02 0.23 -0.01 -0.02 -0.02 -0.03 -0.12 0.14 -0.03 -0.02 -0.01 -0.02 -0.03 -0.02 -0.02 0.13 -0.01 0.56 -0.13 -0.16 -0.10 -0.05 -0.01 -0.04 -0.08 -0.09 -0.02 -0.01 -0.03 1.00 0.13 -0.11 -0.04 -0.06 -0.04 -0.04 0.43 -0.06 -0.04 -0.03 -0.04 -0.03 -0.03 -0.05 -0.04 0.15 -0.15 -0.01 0.01 -0.05 -0.06 -0.07 0.06 0.03 -0.03 0.02 -0.02 0.02 -0.02 0.02 0.03 -0.05
SectionID.A 0.04 -0.04 -0.04 -0.06 0.02 0.15 -0.08 -0.02 -0.06 -0.02 0.06 -0.13 0.07 -0.08 -0.02 0.04 -0.01 -0.06 0.02 0.15 -0.11 -0.05 -0.06 -0.02 0.12 -0.03 0.06 -0.07 -0.06 0.04 0.11 -0.36 0.29 -0.45 0.08 0.07 0.22 0.02 0.20 0.09 0.08 -0.04 0.13 1.00 -0.88 -0.31 0.00 0.01 0.19 0.25 -0.20 0.19 0.17 -0.21 0.07 0.18 -0.18 -0.17 0.05 -0.05 0.02 -0.02 0.14 0.06 0.13 0.08 -0.01 0.01 -0.07 0.07 0.02 -0.02 0.00 -0.04 0.03
SectionID.B -0.02 0.02 0.06 0.00 0.01 -0.08 0.01 0.00 0.08 0.03 -0.03 0.15 -0.05 0.02 0.04 -0.03 0.03 0.00 0.01 -0.07 0.02 0.03 0.08 0.03 -0.11 0.03 -0.04 0.00 0.08 -0.03 -0.08 0.34 -0.30 0.41 -0.04 -0.06 -0.20 0.05 -0.29 -0.07 -0.07 0.07 -0.11 -0.88 1.00 -0.19 0.05 0.03 -0.17 -0.22 0.26 -0.17 -0.15 0.12 -0.05 -0.16 0.23 -0.09 -0.04 0.04 -0.03 0.03 -0.10 -0.02 -0.08 -0.03 -0.01 0.01 0.05 -0.05 0.00 0.00 0.03 0.04 -0.07
SectionID.C -0.05 0.05 -0.04 0.13 -0.06 -0.14 0.16 0.04 -0.03 -0.02 -0.06 -0.04 -0.03 0.12 -0.03 -0.01 -0.04 0.13 -0.06 -0.18 0.17 0.04 -0.03 -0.02 -0.04 0.00 -0.03 0.15 -0.05 -0.01 -0.07 0.04 -0.01 0.11 -0.09 -0.02 -0.07 -0.13 0.16 -0.03 -0.02 -0.04 -0.04 -0.31 -0.19 1.00 -0.10 -0.07 -0.06 -0.08 -0.10 -0.06 -0.05 0.20 -0.06 -0.06 -0.09 0.52 -0.02 0.02 0.02 -0.02 -0.08 -0.09 -0.10 -0.10 0.03 -0.03 0.04 -0.04 -0.05 0.05 -0.07 0.00 0.07
Topic.Arabic -0.07 0.07 -0.05 -0.04 0.10 0.00 -0.03 0.07 -0.04 0.18 0.02 -0.01 -0.05 -0.06 -0.04 -0.02 -0.05 -0.04 0.10 0.03 -0.03 0.02 -0.04 0.18 -0.05 0.04 -0.04 -0.05 -0.07 -0.02 -0.10 0.08 -0.03 0.16 -0.10 -0.03 -0.10 -0.19 0.20 -0.04 -0.03 -0.06 -0.06 0.00 0.05 -0.10 1.00 -0.10 -0.09 -0.12 -0.15 -0.09 -0.08 -0.19 -0.08 -0.08 -0.13 -0.09 -0.15 0.15 -0.01 0.01 -0.04 -0.02 0.02 0.02 -0.01 0.01 0.08 -0.08 -0.01 0.01 0.02 0.02 -0.04
Topic.Biology -0.02 0.02 -0.04 -0.03 0.11 0.09 -0.20 -0.05 0.13 -0.02 0.16 -0.04 0.11 -0.04 -0.03 -0.01 -0.04 -0.03 0.11 0.13 -0.20 -0.05 0.13 -0.02 0.20 -0.05 0.13 -0.04 -0.05 -0.01 -0.07 -0.22 0.25 -0.17 -0.09 -0.02 -0.07 0.50 -0.15 -0.03 -0.02 -0.04 -0.04 0.01 0.03 -0.07 -0.10 1.00 -0.06 -0.08 -0.10 -0.06 -0.05 -0.13 -0.06 -0.06 -0.09 -0.06 -0.01 0.01 -0.03 0.03 0.17 0.17 0.13 0.04 -0.02 0.02 -0.10 0.10 -0.07 0.07 0.13 -0.08 -0.06
Topic.Chemistry 0.06 -0.06 -0.03 -0.03 0.04 0.27 -0.18 -0.04 -0.03 -0.02 -0.06 -0.04 -0.03 -0.04 -0.03 -0.01 -0.03 -0.03 0.04 0.22 -0.18 -0.05 -0.03 -0.02 -0.03 0.06 -0.03 -0.03 -0.04 -0.01 -0.06 -0.19 0.22 -0.15 -0.08 -0.02 -0.06 -0.12 0.41 -0.02 -0.02 -0.04 -0.04 0.19 -0.17 -0.06 -0.09 -0.06 1.00 -0.07 -0.09 -0.05 -0.05 -0.11 -0.05 -0.05 -0.08 -0.05 0.00 0.00 -0.04 0.04 0.08 0.09 0.05 -0.04 -0.09 0.09 -0.07 0.07 0.05 -0.05 0.06 0.04 -0.09
Topic.English 0.04 -0.04 0.01 -0.04 0.00 0.01 -0.03 0.02 -0.04 -0.03 0.10 0.00 -0.04 -0.05 0.03 -0.01 0.01 -0.04 0.00 0.10 -0.03 0.01 -0.04 -0.03 -0.05 -0.06 -0.04 -0.04 0.02 -0.01 0.22 -0.18 0.07 -0.21 -0.04 0.25 0.66 -0.13 -0.18 -0.03 -0.03 -0.01 0.43 0.25 -0.22 -0.08 -0.12 -0.08 -0.07 1.00 -0.13 -0.07 -0.07 -0.16 -0.07 -0.07 -0.11 -0.08 0.07 -0.07 -0.09 0.09 0.04 -0.05 0.01 0.01 0.09 -0.09 0.02 -0.02 0.02 -0.02 0.06 -0.03 -0.03
Topic.French 0.08 -0.08 0.04 0.07 -0.03 0.12 -0.24 0.06 0.17 0.03 0.01 -0.02 0.10 0.05 0.01 -0.02 0.04 0.07 -0.03 0.13 -0.24 0.04 0.17 0.03 0.03 -0.04 0.12 0.04 0.03 -0.02 -0.08 0.46 -0.41 0.58 -0.13 -0.03 -0.11 -0.20 -0.22 -0.04 -0.04 -0.03 -0.06 -0.20 0.26 -0.10 -0.15 -0.10 -0.09 -0.13 1.00 -0.09 -0.08 -0.20 -0.08 -0.09 -0.14 -0.09 -0.14 0.14 -0.23 0.23 -0.08 0.08 -0.06 -0.24 0.11 -0.11 -0.07 0.07 -0.06 0.06 0.01 -0.02 0.01
Topic.Geology 0.02 -0.02 -0.03 -0.03 0.04 0.23 -0.18 -0.04 -0.03 -0.02 0.02 -0.04 -0.03 -0.04 -0.03 -0.01 -0.03 -0.03 0.04 0.14 -0.18 -0.05 -0.03 -0.02 0.10 0.17 -0.03 -0.03 -0.04 -0.01 -0.06 -0.19 0.22 -0.15 -0.08 -0.02 -0.06 -0.12 0.41 -0.02 -0.02 -0.04 -0.04 0.19 -0.17 -0.06 -0.09 -0.06 -0.05 -0.07 -0.09 1.00 -0.05 -0.11 -0.05 -0.05 -0.08 -0.05 0.00 0.00 -0.04 0.04 0.21 0.19 0.20 0.08 -0.09 0.09 -0.07 0.07 -0.07 0.07 -0.02 -0.14 0.14
Topic.History 0.02 -0.02 -0.03 -0.02 0.06 0.03 0.00 -0.04 -0.02 -0.02 0.04 -0.03 -0.02 -0.03 -0.02 -0.01 -0.03 -0.02 0.06 0.07 0.00 -0.04 -0.02 -0.02 -0.03 -0.04 -0.02 -0.03 -0.04 -0.01 -0.06 -0.02 0.05 -0.13 0.18 -0.02 -0.05 -0.10 0.18 -0.02 -0.02 -0.03 -0.03 0.17 -0.15 -0.05 -0.08 -0.05 -0.05 -0.07 -0.08 -0.05 1.00 -0.10 -0.04 -0.04 -0.07 -0.05 -0.08 0.08 0.04 -0.04 0.07 0.09 0.16 0.16 -0.07 0.07 -0.08 0.08 0.03 -0.03 -0.04 -0.05 0.08
Topic.IT -0.03 0.03 -0.03 0.04 -0.11 -0.33 0.50 -0.07 -0.06 -0.05 -0.12 -0.01 -0.06 -0.08 0.04 0.09 -0.03 0.04 -0.11 -0.33 0.50 -0.07 -0.06 -0.05 -0.07 -0.03 -0.06 -0.07 -0.03 0.09 0.07 0.24 -0.27 0.27 -0.03 -0.04 -0.07 0.01 -0.28 0.21 0.18 -0.08 -0.04 -0.21 0.12 0.20 -0.19 -0.13 -0.11 -0.16 -0.20 -0.11 -0.10 1.00 -0.11 -0.11 -0.17 -0.12 0.43 -0.43 0.28 -0.28 -0.25 -0.29 -0.36 -0.02 0.00 0.00 0.07 -0.07 0.08 -0.08 -0.15 0.15 0.00
Topic.Math -0.06 0.06 0.05 -0.02 -0.05 -0.16 0.15 0.07 -0.02 -0.02 -0.05 0.04 -0.03 -0.03 0.16 -0.01 0.05 -0.02 -0.05 -0.16 0.15 0.06 -0.02 -0.02 -0.03 -0.04 -0.02 -0.03 0.13 -0.01 0.02 -0.14 0.13 -0.14 0.00 -0.02 -0.02 0.21 -0.05 -0.02 -0.02 0.09 -0.03 0.07 -0.05 -0.06 -0.08 -0.06 -0.05 -0.07 -0.08 -0.05 -0.04 -0.11 1.00 -0.05 -0.07 -0.05 0.11 -0.11 0.10 -0.10 -0.06 -0.13 -0.08 -0.01 -0.02 0.02 0.04 -0.04 0.03 -0.03 0.00 0.03 -0.03
Topic.Quran 0.02 -0.02 0.04 -0.02 -0.05 -0.06 0.00 0.07 -0.02 -0.02 -0.05 0.03 0.06 0.22 -0.02 -0.01 0.12 -0.02 -0.05 -0.13 -0.05 0.11 -0.02 -0.02 -0.03 0.07 0.07 0.19 0.13 -0.01 0.10 -0.18 0.13 -0.15 -0.07 -0.02 -0.02 0.30 -0.12 -0.02 -0.02 0.21 -0.03 0.18 -0.16 -0.06 -0.08 -0.06 -0.05 -0.07 -0.09 -0.05 -0.04 -0.11 -0.05 1.00 -0.08 -0.05 -0.06 0.06 0.02 -0.02 0.06 0.07 0.04 0.01 0.01 -0.01 0.07 -0.07 -0.04 0.04 0.03 0.00 -0.03
Topic.Science 0.06 -0.06 0.10 -0.04 -0.01 0.08 -0.08 -0.07 -0.04 -0.03 0.03 0.08 -0.04 0.03 -0.04 -0.02 0.05 -0.04 -0.01 0.07 -0.06 0.00 -0.04 -0.03 0.04 -0.03 -0.04 0.00 0.01 -0.02 0.01 0.08 -0.09 -0.23 0.49 -0.03 -0.07 0.12 -0.18 -0.04 -0.03 0.11 -0.05 -0.18 0.23 -0.09 -0.13 -0.09 -0.08 -0.11 -0.14 -0.08 -0.07 -0.17 -0.07 -0.08 1.00 -0.08 -0.11 0.11 -0.03 0.03 0.06 0.03 0.16 0.17 -0.02 0.02 -0.03 0.03 0.04 -0.04 0.01 -0.05 0.04
Topic.Spanish -0.16 0.16 -0.03 0.14 -0.05 -0.14 0.09 0.06 -0.03 -0.02 -0.06 0.03 0.05 0.14 -0.03 -0.01 -0.03 0.14 -0.05 -0.16 0.11 0.05 -0.03 -0.02 -0.03 0.01 -0.03 0.17 0.01 -0.01 -0.03 -0.20 0.21 -0.16 -0.08 -0.02 -0.06 -0.12 0.39 -0.02 -0.02 0.02 -0.04 -0.17 -0.09 0.52 -0.09 -0.06 -0.05 -0.08 -0.09 -0.05 -0.05 -0.12 -0.05 -0.05 -0.08 1.00 -0.24 0.24 0.00 0.00 -0.03 -0.02 -0.02 -0.10 0.02 -0.02 0.08 -0.08 -0.04 0.04 -0.05 0.03 0.02
Semester.F 0.05 -0.05 -0.08 -0.04 0.00 -0.04 0.18 -0.08 0.00 -0.09 -0.01 -0.07 -0.02 -0.14 0.07 0.04 -0.05 -0.04 0.00 -0.04 0.16 -0.08 0.00 -0.09 0.00 -0.03 0.00 -0.11 -0.03 0.04 0.10 0.09 -0.14 0.12 -0.06 0.08 -0.02 0.08 -0.22 0.10 0.09 -0.09 0.15 0.05 -0.04 -0.02 -0.15 -0.01 0.00 0.07 -0.14 0.00 -0.08 0.43 0.11 -0.06 -0.11 -0.24 1.00 -1.00 0.15 -0.15 -0.18 -0.17 -0.29 -0.02 0.02 -0.02 -0.03 0.03 0.07 -0.07 -0.10 0.12 -0.01
Semester.S -0.05 0.05 0.08 0.04 0.00 0.04 -0.18 0.08 0.00 0.09 0.01 0.07 0.02 0.14 -0.07 -0.04 0.05 0.04 0.00 0.04 -0.16 0.08 0.00 0.09 0.00 0.03 0.00 0.11 0.03 -0.04 -0.10 -0.09 0.14 -0.12 0.06 -0.08 0.02 -0.08 0.22 -0.10 -0.09 0.09 -0.15 -0.05 0.04 0.02 0.15 0.01 0.00 -0.07 0.14 0.00 0.08 -0.43 -0.11 0.06 0.11 0.24 -1.00 1.00 -0.15 0.15 0.18 0.17 0.29 0.02 -0.02 0.02 0.03 -0.03 -0.07 0.07 0.10 -0.12 0.01
Relation.Father -0.20 0.20 -0.07 -0.06 0.02 -0.20 0.29 -0.09 -0.13 -0.06 -0.05 0.10 0.00 0.03 -0.02 -0.05 -0.10 -0.06 0.02 -0.18 0.31 -0.11 -0.13 -0.06 -0.06 0.06 -0.02 -0.01 -0.01 -0.05 0.04 -0.02 0.00 -0.03 0.01 0.01 -0.08 0.10 -0.04 0.04 0.03 0.03 -0.01 0.02 -0.03 0.02 -0.01 -0.03 -0.04 -0.09 -0.23 -0.04 0.04 0.28 0.10 0.02 -0.03 0.00 0.15 -0.15 1.00 -1.00 -0.36 -0.36 -0.34 -0.03 0.16 -0.16 0.29 -0.29 0.22 -0.22 -0.39 0.28 0.11
Relation.Mum 0.20 -0.20 0.07 0.06 -0.02 0.20 -0.29 0.09 0.13 0.06 0.05 -0.10 0.00 -0.03 0.02 0.05 0.10 0.06 -0.02 0.18 -0.31 0.11 0.13 0.06 0.06 -0.06 0.02 0.01 0.01 0.05 -0.04 0.02 0.00 0.03 -0.01 -0.01 0.08 -0.10 0.04 -0.04 -0.03 -0.03 0.01 -0.02 0.03 -0.02 0.01 0.03 0.04 0.09 0.23 0.04 -0.04 -0.28 -0.10 -0.02 0.03 0.00 -0.15 0.15 -1.00 1.00 0.36 0.36 0.34 0.03 -0.16 0.16 -0.29 0.29 -0.22 0.22 0.39 -0.28 -0.11
raisedhands 0.15 -0.15 -0.02 -0.09 0.19 0.05 -0.26 0.10 -0.12 0.03 0.28 0.04 -0.03 -0.01 -0.02 0.05 0.02 -0.09 0.19 0.11 -0.27 0.11 -0.12 0.03 0.16 0.02 -0.01 -0.03 0.05 0.05 -0.03 -0.23 0.24 -0.22 0.00 -0.09 0.13 0.02 0.18 -0.08 -0.03 0.06 -0.05 0.14 -0.10 -0.08 -0.04 0.17 0.08 0.04 -0.08 0.21 0.07 -0.25 -0.06 0.06 0.06 -0.03 -0.18 0.18 -0.36 0.36 1.00 0.69 0.64 0.34 -0.32 0.32 -0.30 0.30 -0.46 0.46 0.50 -0.58 0.06
VisITedResources 0.21 -0.21 0.01 -0.08 0.19 0.19 -0.33 0.05 -0.17 0.01 0.16 0.01 -0.01 0.04 -0.01 0.05 0.03 -0.08 0.19 0.20 -0.34 0.07 -0.17 0.01 0.14 -0.01 0.02 0.04 0.04 0.05 -0.03 -0.10 0.12 -0.07 -0.03 -0.10 0.00 -0.02 0.15 -0.03 -0.03 0.04 -0.06 0.06 -0.02 -0.09 -0.02 0.17 0.09 -0.05 0.08 0.19 0.09 -0.29 -0.13 0.07 0.03 -0.02 -0.17 0.17 -0.36 0.36 0.69 1.00 0.59 0.24 -0.38 0.38 -0.36 0.36 -0.50 0.50 0.47 -0.66 0.16
AnnouncementsView 0.05 -0.05 0.03 -0.05 0.15 0.13 -0.32 0.04 -0.12 0.08 0.20 0.07 0.00 0.02 -0.01 0.06 0.06 -0.05 0.15 0.14 -0.33 0.06 -0.12 0.08 0.19 -0.01 0.01 0.01 0.12 0.06 -0.01 -0.21 0.21 -0.24 0.07 -0.08 0.09 0.00 0.19 -0.04 -0.02 0.09 -0.07 0.13 -0.08 -0.10 0.02 0.13 0.05 0.01 -0.06 0.20 0.16 -0.36 -0.08 0.04 0.16 -0.02 -0.29 0.29 -0.34 0.34 0.64 0.59 1.00 0.42 -0.40 0.40 -0.30 0.30 -0.31 0.31 0.38 -0.50 0.10
Discussion 0.12 -0.12 0.01 0.00 0.06 -0.01 0.02 -0.07 -0.16 0.02 0.09 0.06 0.01 -0.12 -0.04 0.06 0.03 0.00 0.06 -0.05 0.01 -0.02 -0.16 0.02 0.16 0.02 0.02 -0.10 0.03 0.06 0.10 -0.15 0.10 -0.21 0.09 -0.04 0.02 0.10 0.01 0.05 -0.03 0.07 0.06 0.08 -0.03 -0.10 0.02 0.04 -0.04 0.01 -0.24 0.08 0.16 -0.02 -0.01 0.01 0.17 -0.10 -0.02 0.02 -0.03 0.03 0.34 0.24 0.42 1.00 -0.23 0.23 -0.06 0.06 -0.22 0.22 0.24 -0.27 0.02
ParentAnsweringSurvey.No -0.02 0.02 0.03 0.01 -0.11 0.04 0.05 -0.03 0.13 0.06 -0.08 -0.05 -0.04 -0.01 -0.06 -0.04 0.03 0.01 -0.11 0.00 0.05 -0.05 0.13 0.06 -0.13 0.05 -0.02 0.00 -0.02 -0.04 -0.02 0.13 -0.11 0.09 0.06 0.09 0.03 -0.04 -0.12 -0.05 -0.03 -0.02 0.03 -0.01 -0.01 0.03 -0.01 -0.02 -0.09 0.09 0.11 -0.09 -0.07 0.00 -0.02 0.01 -0.02 0.02 0.02 -0.02 0.16 -0.16 -0.32 -0.38 -0.40 -0.23 1.00 -1.00 0.54 -0.54 0.26 -0.26 -0.31 0.41 -0.08
ParentAnsweringSurvey.Yes 0.02 -0.02 -0.03 -0.01 0.11 -0.04 -0.05 0.03 -0.13 -0.06 0.08 0.05 0.04 0.01 0.06 0.04 -0.03 -0.01 0.11 0.00 -0.05 0.05 -0.13 -0.06 0.13 -0.05 0.02 0.00 0.02 0.04 0.02 -0.13 0.11 -0.09 -0.06 -0.09 -0.03 0.04 0.12 0.05 0.03 0.02 -0.03 0.01 0.01 -0.03 0.01 0.02 0.09 -0.09 -0.11 0.09 0.07 0.00 0.02 -0.01 0.02 -0.02 -0.02 0.02 -0.16 0.16 0.32 0.38 0.40 0.23 -1.00 1.00 -0.54 0.54 -0.26 0.26 0.31 -0.41 0.08
ParentschoolSatisfaction.Bad -0.09 0.09 -0.05 0.02 -0.18 -0.01 0.18 0.01 -0.09 0.07 -0.20 0.08 -0.03 0.06 -0.05 -0.04 -0.05 0.02 -0.18 -0.11 0.18 0.01 -0.09 0.07 -0.12 0.09 -0.01 0.05 0.04 -0.04 0.02 -0.01 0.00 -0.01 0.00 0.04 -0.01 0.00 0.00 -0.04 0.02 0.02 0.02 -0.07 0.05 0.04 0.08 -0.10 -0.07 0.02 -0.07 -0.07 -0.08 0.07 0.04 0.07 -0.03 0.08 -0.03 0.03 0.29 -0.29 -0.30 -0.36 -0.30 -0.06 0.54 -0.54 1.00 -1.00 0.23 -0.23 -0.30 0.33 -0.02
ParentschoolSatisfaction.Good 0.09 -0.09 0.05 -0.02 0.18 0.01 -0.18 -0.01 0.09 -0.07 0.20 -0.08 0.03 -0.06 0.05 0.04 0.05 -0.02 0.18 0.11 -0.18 -0.01 0.09 -0.07 0.12 -0.09 0.01 -0.05 -0.04 0.04 -0.02 0.01 0.00 0.01 0.00 -0.04 0.01 0.00 0.00 0.04 -0.02 -0.02 -0.02 0.07 -0.05 -0.04 -0.08 0.10 0.07 -0.02 0.07 0.07 0.08 -0.07 -0.04 -0.07 0.03 -0.08 0.03 -0.03 -0.29 0.29 0.30 0.36 0.30 0.06 -0.54 0.54 -1.00 1.00 -0.23 0.23 0.30 -0.33 0.02
StudentAbsenceDays.Above.7 -0.21 0.21 0.04 0.06 -0.06 0.04 0.08 -0.11 0.14 -0.03 -0.17 -0.01 0.01 -0.02 -0.05 -0.04 0.01 0.06 -0.06 0.01 0.09 -0.12 0.14 -0.03 -0.12 -0.01 -0.01 -0.02 -0.06 -0.04 -0.04 0.12 -0.10 0.05 0.08 0.10 -0.06 -0.01 -0.06 -0.04 -0.03 -0.03 0.02 0.02 0.00 -0.05 -0.01 -0.07 0.05 0.02 -0.06 -0.07 0.03 0.08 0.03 -0.04 0.04 -0.04 0.07 -0.07 0.22 -0.22 -0.46 -0.50 -0.31 -0.22 0.26 -0.26 0.23 -0.23 1.00 -1.00 -0.49 0.63 -0.11
StudentAbsenceDays.Under.7 0.21 -0.21 -0.04 -0.06 0.06 -0.04 -0.08 0.11 -0.14 0.03 0.17 0.01 -0.01 0.02 0.05 0.04 -0.01 -0.06 0.06 -0.01 -0.09 0.12 -0.14 0.03 0.12 0.01 0.01 0.02 0.06 0.04 0.04 -0.12 0.10 -0.05 -0.08 -0.10 0.06 0.01 0.06 0.04 0.03 0.03 -0.02 -0.02 0.00 0.05 0.01 0.07 -0.05 -0.02 0.06 0.07 -0.03 -0.08 -0.03 0.04 -0.04 0.04 -0.07 0.07 -0.22 0.22 0.46 0.50 0.31 0.22 -0.26 0.26 -0.23 0.23 -1.00 1.00 0.49 -0.63 0.11
Class.H 0.22 -0.22 -0.02 -0.07 0.16 0.02 -0.16 0.10 -0.07 -0.01 0.07 0.08 0.00 -0.02 0.05 0.07 0.01 -0.07 0.16 0.01 -0.17 0.13 -0.07 -0.01 0.10 0.06 0.01 0.01 0.03 0.07 0.02 -0.04 0.02 -0.02 0.00 -0.05 0.08 -0.01 -0.01 -0.07 -0.01 0.06 0.02 0.00 0.03 -0.07 0.02 0.13 0.06 0.06 0.01 -0.02 -0.04 -0.15 0.00 0.03 0.01 -0.05 -0.10 0.10 -0.39 0.39 0.50 0.47 0.38 0.24 -0.31 0.31 -0.30 0.30 -0.49 0.49 1.00 -0.39 -0.57
Class.L -0.22 0.22 0.02 0.02 -0.13 -0.08 0.20 -0.06 0.19 0.00 -0.15 -0.06 0.01 0.02 -0.02 -0.03 0.02 0.02 -0.13 -0.12 0.21 -0.07 0.19 0.00 -0.09 -0.01 -0.02 0.02 -0.06 -0.03 -0.01 0.12 -0.11 0.11 -0.03 0.13 -0.12 0.01 -0.06 -0.02 0.00 -0.04 0.03 -0.04 0.04 0.00 0.02 -0.08 0.04 -0.03 -0.02 -0.14 -0.05 0.15 0.03 0.00 -0.05 0.03 0.12 -0.12 0.28 -0.28 -0.58 -0.66 -0.50 -0.27 0.41 -0.41 0.33 -0.33 0.63 -0.63 -0.39 1.00 -0.53
Class.M -0.01 0.01 0.00 0.05 -0.03 0.06 -0.03 -0.03 -0.10 0.01 0.07 -0.02 0.00 -0.01 -0.02 -0.04 -0.03 0.05 -0.03 0.10 -0.03 -0.05 -0.10 0.01 -0.01 -0.05 0.01 -0.03 0.02 -0.04 -0.01 -0.07 0.08 -0.08 0.03 -0.07 0.03 0.00 0.07 0.07 0.01 -0.02 -0.05 0.03 -0.07 0.07 -0.04 -0.06 -0.09 -0.03 0.01 0.14 0.08 0.00 -0.03 -0.03 0.04 0.02 -0.01 0.01 0.11 -0.11 0.06 0.16 0.10 0.02 -0.08 0.08 -0.02 0.02 -0.11 0.11 -0.57 -0.53 1.00

As you can see the data does not seem to make sense with all these repetitve jargons, now we will retrace our steps and work with creating a pairwise correlation in only Numeric Values and observing their p-values against our Outcome Variable in a graph, we will reserve encoding for more complex matters.

crr_valid <- cor(numericVars, use = "pairwise")
kable(round(crr_valid, 2))
raisedhands VisITedResources AnnouncementsView Discussion
raisedhands 1.00 0.69 0.64 0.34
VisITedResources 0.69 1.00 0.59 0.24
AnnouncementsView 0.64 0.59 1.00 0.42
Discussion 0.34 0.24 0.42 1.00
library(ggcorrplot)

ggcorrplot(crr_valid, 
           hc.order = TRUE, 
           type = "lower",
           lab = TRUE)

The highlight of this Pairwise Correlation is that all of our Numeric Variable have a positive Relation with themselves, the next step is to see how they particularly relate to the Outcome Variable, testing with P-Value, i.e where in our case we set a 0.05 level of significance that a value below this would indicate a significant Relationship and vice versa.

MultiVariate Relationship

Correlation with outcome Variable: Numeric Variable

## Append and Encode Outcome Variable to Numeric Variables
numericVars$Class <- edu_Df$Class

## nested condition for encoding
numericVars$Class <- ifelse(numericVars$Class == "H", 3, 
                           ifelse(numericVars$Class == "M", 2, 1))

## Correlation On Class
crr_outcome <- cor(numericVars, use = "pairwise")
kable(round(crr_outcome, 2))
raisedhands VisITedResources AnnouncementsView Discussion Class
raisedhands 1.00 0.69 0.64 0.34 0.65
VisITedResources 0.69 1.00 0.59 0.24 0.68
AnnouncementsView 0.64 0.59 1.00 0.42 0.53
Discussion 0.34 0.24 0.42 1.00 0.31
Class 0.65 0.68 0.53 0.31 1.00
## Visualize the Relaitonship ~ P-Value
crr_outcome %>%
  corrplot(method = "color", type = "lower", tl.col = "black", tl.srt = 45,
           p.mat = cor.mtest(crr_outcome)$p,
           insig = "p-value", sig.level = -1)

VisitedResources variable here seems to be the biggest PRedictor of a Student’s Grades.

Now let us turn our Focus on Factor Variables - Keep in my that our Outcome Variable is a Ordinal Categorical/Factor vARIABLE, and the Chi Sq Test is excellent for small sample, CAT on CAT statistical Analysis.

## Chi Sq distribution
library(MASS)
## 
## Attaching package: 'MASS'
## The following object is masked from 'package:dplyr':
## 
##     select
for (var in names(factorVars)) {
  if (var != "Class"){
    cat("+----------------------+")
    cat("\n","Data Table for",var, "Variable","\n")
    # contigency table
    factor_hd <- table(edu_Df[[var]], edu_Df$Class)
    cat("----------------------")
    print(factor_hd)
    cat("----------------------")
    cat("\n","Chi Square Test @ 0.05")
    # chiSq
    print(chisq.test(factor_hd))
    cat("+----------------------+","\n\n")
    Xsq <- chisq.test(factor_hd)
    # barplot(Xsq$observed, Xsq$expected, beside = TRUE)
  }
  
}
## +----------------------+
##  Data Table for gender Variable 
## ----------------------   
##       H   L   M
##   F  75  24  76
##   M  67 103 135
## ----------------------
##  Chi Square Test @ 0.05
##  Pearson's Chi-squared test
## 
## data:  factor_hd
## X-squared = 33.326, df = 2, p-value = 5.798e-08
## 
## +----------------------+ 
## 
## +----------------------+
##  Data Table for NationalITy Variable 
## ----------------------             
##                H  L  M
##   Egypt        2  3  4
##   Iran         0  2  4
##   Iraq        14  0  8
##   Jordan      53 37 82
##   KW          36 68 75
##   lebanon      9  2  6
##   Lybia        0  6  0
##   Morocco      1  1  2
##   Palestine   12  0 16
##   SaudiArabia  6  1  4
##   Syria        2  2  3
##   Tunis        3  4  5
##   USA          3  1  2
##   venzuela     1  0  0
## ----------------------
##  Chi Square Test @ 0.05
## Warning in chisq.test(factor_hd): Chi-squared approximation may be incorrect
## 
##  Pearson's Chi-squared test
## 
## data:  factor_hd
## X-squared = 73.84, df = 26, p-value = 1.802e-06
## 
## +----------------------+
## Warning in chisq.test(factor_hd): Chi-squared approximation may be incorrect
## +----------------------+
##  Data Table for PlaceofBirth Variable 
## ----------------------             
##                H  L  M
##   Egypt        3  3  3
##   Iran         0  2  4
##   Iraq        14  0  8
##   Jordan      53 34 89
##   KuwaIT      35 69 76
##   lebanon     11  2  6
##   Lybia        0  6  0
##   Morocco      1  1  2
##   Palestine    6  0  4
##   SaudiArabia  7  4  5
##   Syria        2  1  3
##   Tunis        3  3  3
##   USA          6  2  8
##   venzuela     1  0  0
## ----------------------
##  Chi Square Test @ 0.05
## Warning in chisq.test(factor_hd): Chi-squared approximation may be incorrect
## 
##  Pearson's Chi-squared test
## 
## data:  factor_hd
## X-squared = 75.513, df = 26, p-value = 1.012e-06
## 
## +----------------------+
## Warning in chisq.test(factor_hd): Chi-squared approximation may be incorrect
## +----------------------+
##  Data Table for StageID Variable 
## ----------------------              
##                  H   L   M
##   HighSchool    11   8  14
##   lowerlevel    55  65  79
##   MiddleSchool  76  54 118
## ----------------------
##  Chi Square Test @ 0.05
##  Pearson's Chi-squared test
## 
## data:  factor_hd
## X-squared = 7.099, df = 4, p-value = 0.1307
## 
## +----------------------+ 
## 
## +----------------------+
##  Data Table for GradeID Variable 
## ----------------------      
##         H  L  M
##   G-02 41 50 56
##   G-04 14 11 23
##   G-05  0  3  0
##   G-06 14  2 16
##   G-07 29 28 44
##   G-08 33 25 58
##   G-09  0  1  4
##   G-10  1  1  2
##   G-11  6  2  5
##   G-12  4  4  3
## ----------------------
##  Chi Square Test @ 0.05
## Warning in chisq.test(factor_hd): Chi-squared approximation may be incorrect
## 
##  Pearson's Chi-squared test
## 
## data:  factor_hd
## X-squared = 29.013, df = 18, p-value = 0.04822
## 
## +----------------------+
## Warning in chisq.test(factor_hd): Chi-squared approximation may be incorrect
## +----------------------+
##  Data Table for SectionID Variable 
## ----------------------   
##       H   L   M
##   A  84  71 128
##   B  53  48  66
##   C   5   8  17
## ----------------------
##  Chi Square Test @ 0.05
##  Pearson's Chi-squared test
## 
## data:  factor_hd
## X-squared = 4.4394, df = 4, p-value = 0.3498
## 
## +----------------------+ 
## 
## +----------------------+
##  Data Table for Topic Variable 
## ----------------------           
##              H  L  M
##   Arabic    19 17 23
##   Biology   16  4 10
##   Chemistry 10  8  6
##   English   17 10 18
##   French    20 16 29
##   Geology    6  0 18
##   History    4  3 12
##   IT        15 38 42
##   Math       6  7  8
##   Quran      8  6  8
##   Science   16 10 25
##   Spanish    5  8 12
## ----------------------
##  Chi Square Test @ 0.05
##  Pearson's Chi-squared test
## 
## data:  factor_hd
## X-squared = 45.174, df = 22, p-value = 0.002522
## 
## +----------------------+ 
## 
## +----------------------+
##  Data Table for Semester Variable 
## ----------------------   
##       H   L   M
##   F  62  77 106
##   S  80  50 105
## ----------------------
##  Chi Square Test @ 0.05
##  Pearson's Chi-squared test
## 
## data:  factor_hd
## X-squared = 7.8216, df = 2, p-value = 0.02002
## 
## +----------------------+ 
## 
## +----------------------+
##  Data Table for Relation Variable 
## ----------------------        
##            H   L   M
##   Father  42 104 137
##   Mum    100  23  74
## ----------------------
##  Chi Square Test @ 0.05
##  Pearson's Chi-squared test
## 
## data:  factor_hd
## X-squared = 81.366, df = 2, p-value < 2.2e-16
## 
## +----------------------+ 
## 
## +----------------------+
##  Data Table for ParentAnsweringSurvey Variable 
## ----------------------     
##         H   L   M
##   No   28  99  83
##   Yes 114  28 128
## ----------------------
##  Chi Square Test @ 0.05
##  Pearson's Chi-squared test
## 
## data:  factor_hd
## X-squared = 95.365, df = 2, p-value < 2.2e-16
## 
## +----------------------+ 
## 
## +----------------------+
##  Data Table for ParentschoolSatisfaction Variable 
## ----------------------      
##          H   L   M
##   Bad   24  84  80
##   Good 118  43 131
## ----------------------
##  Chi Square Test @ 0.05
##  Pearson's Chi-squared test
## 
## data:  factor_hd
## X-squared = 68.47, df = 2, p-value = 1.355e-15
## 
## +----------------------+ 
## 
## +----------------------+
##  Data Table for StudentAbsenceDays Variable 
## ----------------------         
##             H   L   M
##   Above-7   4 116  71
##   Under-7 138  11 140
## ----------------------
##  Chi Square Test @ 0.05
##  Pearson's Chi-squared test
## 
## data:  factor_hd
## X-squared = 225.2, df = 2, p-value < 2.2e-16
## 
## +----------------------+

P-values < 0.05 show a significant relationship and vice versa.

– AFL[ | Rpubs] (https://rpubs.com/AfroLogicInsect/727450)