Import Dataset dan Library

library(dplyr)
## 
## Attaching package: 'dplyr'
## The following objects are masked from 'package:stats':
## 
##     filter, lag
## The following objects are masked from 'package:base':
## 
##     intersect, setdiff, setequal, union
library(readxl)
Ket <- read_excel("D:/STIS/3SE3/2. METPEN_Pak Dedi/0. Tugas Akhir Impact Of Covid19 in Education/5. Metpen TA Kelompok/Bab 4/DataMetpen.xlsx",sheet = "Keterangan")

PSS <- read_excel("D:/STIS/3SE3/2. METPEN_Pak Dedi/0. Tugas Akhir Impact Of Covid19 in Education/5. Metpen TA Kelompok/Bab 4/DataMetpen.xlsx",sheet = "Koding PSS")
## New names:
## * `` -> ...26
## * `` -> ...27
Like <- read_excel("D:/STIS/3SE3/2. METPEN_Pak Dedi/0. Tugas Akhir Impact Of Covid19 in Education/5. Metpen TA Kelompok/Bab 4/DataMetpen.xlsx",sheet = "Dependent Likert")

Depend <- read_excel("D:/STIS/3SE3/2. METPEN_Pak Dedi/0. Tugas Akhir Impact Of Covid19 in Education/5. Metpen TA Kelompok/Bab 4/DataMetpen.xlsx",sheet = "Dependent")

Desc <- read_excel("D:/STIS/3SE3/2. METPEN_Pak Dedi/0. Tugas Akhir Impact Of Covid19 in Education/5. Metpen TA Kelompok/Bab 4/DataMetpen.xlsx",sheet = "Deskriptif")

Ekplorasi Data

Depend <- distinct(Depend)
View(Depend)

DependTk2 <- Depend %>% filter(E %in% c("2D31","2D32","2D33","2D34",
                                        "2KS1","2KS2","2KS3","2KS4",
                                        "2ST1","2ST2","2ST3","2ST4",
                                        "2ST5","2ST6","2ST7","2ST8"))

DependTk3 <- Depend %>% filter(E %in% c("3D31","3D32",
                                        "3SD1","3D32",
                                        "3SE1","3SE2","3SE3","3SE4","3SE5",
                                        "3SK1","3SK2","3SK3","3SK4","3SK5",
                                        "3SI1","3SI2"))
View(DependTk2)
View(DependTk3)
summary(Depend$L)
##    Min. 1st Qu.  Median    Mean 3rd Qu.    Max. 
##   0.000   2.625   3.000   4.261   4.875  24.000
summary(Depend$M)
##    Min. 1st Qu.  Median    Mean 3rd Qu.    Max. 
##   1.000   3.000   4.000   5.222   6.000  40.000
summary(DependTk2$L)
##    Min. 1st Qu.  Median    Mean 3rd Qu.    Max. 
##   1.000   3.000   3.000   4.468   5.000  24.000
summary(DependTk2$M)
##    Min. 1st Qu.  Median    Mean 3rd Qu.    Max. 
##   1.000   4.000   5.000   6.167   6.875  40.000
summary(DependTk3$L)
##    Min. 1st Qu.  Median    Mean 3rd Qu.    Max. 
##   0.000   2.000   3.000   4.057   4.500  20.000
summary(DependTk3$M)
##    Min. 1st Qu.  Median    Mean 3rd Qu.    Max. 
##    1.00    2.00    3.00    4.09    5.00   20.00

Boxplot Perbedaan Lama Belajar Mahasiswa Tingkat 2 dan 3

boxplot(DependTk2$L,DependTk3$L,
        main = "Boxplot Lama Belajar Tingkat 2 dan 3 Sebelum PJJ")

boxplot(DependTk2$M,DependTk3$M,
        main = "Boxplot Lama Belajar Tingkat 2 dan 3 Saat PJJ")

boxplot(DependTk2$L,DependTk2$M,
        main = "Boxplot Lama Belajar Tingkat 2 Sebelum dan Saat PJJ")

boxplot(DependTk3$L,DependTk3$M,
        main = "Boxplot Lama Belajar Tingkat 3 Sebelum dan Saat PJJ")

Outlier Perbedaan Lama Belajar Mahasiswa Tingkat 2 dan 3

outlierL = boxplot.stats(Depend$L)$out
outlierL
##  [1] 10 15 15  9 24 10 14 10 10 14 20
outlier2L = boxplot.stats(DependTk2$L)$out
outlier2L
## [1] 10 15 15  9 24 10 14
outlier3L = boxplot.stats(DependTk3$L)$out
outlier3L
## [1] 10 10 14 20
outlierM = boxplot.stats(Depend$M)$out
outlierM
## [1] 15 15 40 15 12 24 21 20
outlier2M = boxplot.stats(DependTk2$M)$out
outlier2M
## [1] 15 15 40 15 12 24 21
outlier3M = boxplot.stats(DependTk3$M)$out
outlier3M
## [1] 10 20 10
DependFL <- Depend %>% filter( Depend$L < 9 )
DependTk2FL <- DependTk2 %>% filter(DependTk2$L < 9)
DependTk3FL <- DependTk3 %>% filter(DependTk3$L < 10)


DependFM <- DependFL %>% filter(DependFL$L < 12)
DependTk2FM <- DependTk2FL %>% filter(DependTk2FL$M < 12)
DependTk3FM <- DependTk3FL %>% filter(DependTk3FL$M < 10)

T Paired Test Jam Belajar Sebelum-Sesudah PJJ

t.test(DependFM$M,DependFM$L,alternative = "greater",paired = TRUE)
## 
##  Paired t-test
## 
## data:  DependFM$M and DependFM$L
## t = 3.5519, df = 130, p-value = 0.0002667
## alternative hypothesis: true difference in means is greater than 0
## 95 percent confidence interval:
##  0.576358      Inf
## sample estimates:
## mean of the differences 
##                1.080153
t.test(DependTk2FM$M,DependTk2FM$L,alternative = "greater", paired = TRUE)
## 
##  Paired t-test
## 
## data:  DependTk2FM$M and DependTk2FM$L
## t = 6.4748, df = 68, p-value = 6.181e-09
## alternative hypothesis: true difference in means is greater than 0
## 95 percent confidence interval:
##  0.8661953       Inf
## sample estimates:
## mean of the differences 
##                1.166667
t.test(DependTk3FM$M,DependTk3FM$L,alternative = "greater", paired = TRUE)
## 
##  Paired t-test
## 
## data:  DependTk3FM$M and DependTk3FM$L
## t = 0.91771, df = 55, p-value = 0.1814
## alternative hypothesis: true difference in means is greater than 0
## 95 percent confidence interval:
##  -0.1763678        Inf
## sample estimates:
## mean of the differences 
##               0.2142857

Tingkat Pemahaman Materi yang Diajarkan Dosen

boxplot(Like$N,Like$O)

summary(Like$N)
##    Min. 1st Qu.  Median    Mean 3rd Qu.    Max. 
##   1.000   7.000   8.000   7.566   8.000   9.000
summary(Like$O)
##    Min. 1st Qu.  Median    Mean 3rd Qu.    Max. 
##    1.00    6.00    7.00    6.51    8.00    9.00
hist(Like$N,main = "Tingkat Pemahaman Materi yang 
     Diajarkan Dosen Sebelum PJJ")

hist(Like$O,main = "Tingkat Pemahaman Materi yang 
     Diajarkan Dosen Saat PJJ")

wilcox.test(Like$O,Like$N,alternative = "less",paired = TRUE)
## 
##  Wilcoxon signed rank test with continuity correction
## 
## data:  Like$O and Like$N
## V = 641, p-value = 3.622e-14
## alternative hypothesis: true location shift is less than 0

Komunikasi Untuk Mengerjakan Tugas Kelompok Dengan Teman

boxplot(Like$P,Like$Q)

summary(Like$P)
##    Min. 1st Qu.  Median    Mean 3rd Qu.    Max. 
##   1.000   7.000   8.000   7.839   9.000  10.000
summary(Like$Q)
##    Min. 1st Qu.  Median    Mean 3rd Qu.    Max. 
##   1.000   7.000   8.000   7.301   9.000  10.000
hist(Like$P, main = "Histogram Komunikasi Untuk 
     Mengerjakan Tugas Kelompok 
     Dengan Teman Sebelum PJJ")

hist(Like$Q, main = "Histogram Komunikasi Untuk 
     Mengerjakan Tugas Kelompok 
     Dengan Teman Saat PJJ")

wilcox.test(Like$Q,Like$P,alternative = "less",paired = TRUE)
## 
##  Wilcoxon signed rank test with continuity correction
## 
## data:  Like$Q and Like$P
## V = 1544, p-value = 0.0003165
## alternative hypothesis: true location shift is less than 0

Motivasi Untuk Belajar

boxplot(Like$R,Like$S)

summary(Like$R)
##    Min. 1st Qu.  Median    Mean 3rd Qu.    Max. 
##   1.000   7.000   8.000   7.601   9.000  10.000
summary(Like$S)
##    Min. 1st Qu.  Median    Mean 3rd Qu.    Max.    NA's 
##   1.000   7.000   8.000   7.225   8.000  10.000       1
hist(Like$R,main = "Motivasi Untuk Belajar Sebelum PJJ")

hist(Like$R,main = "Motivasi Untuk Belajar Saat PJJ")

wilcox.test(Like$S,Like$R,alternative = "less",paired = TRUE)
## 
##  Wilcoxon signed rank test with continuity correction
## 
## data:  Like$S and Like$R
## V = 1494.5, p-value = 0.01184
## alternative hypothesis: true location shift is less than 0

Mengerjakan Tugas Hingga Larut Malam

boxplot(Like$T,Like$U)

summary(Like$T)
##    Min. 1st Qu.  Median    Mean 3rd Qu.    Max. 
##    1.00    6.00    8.00    7.21    9.00   10.00
summary(Like$U)
##    Min. 1st Qu.  Median    Mean 3rd Qu.    Max. 
##    1.00    7.00    8.00    7.49    9.00   10.00
hist(Like$T,main = "Mengerjakan Tugas Hingga 
     Larut Malam Sebelum PJJ")

hist(Like$U,main = "Mengerjakan Tugas Hingga 
     Larut Malam Saat PJJ")

wilcox.test(Like$U,Like$T,alternative = "greater",paired = TRUE)
## 
##  Wilcoxon signed rank test with continuity correction
## 
## data:  Like$U and Like$T
## V = 2762, p-value = 0.02166
## alternative hypothesis: true location shift is greater than 0

Refreshing

boxplot(Like$V,Like$W)

summary(Like$V)
##    Min. 1st Qu.  Median    Mean 3rd Qu.    Max. 
##   2.000   6.000   7.000   6.853   8.000  10.000
summary(Like$W)
##    Min. 1st Qu.  Median    Mean 3rd Qu.    Max. 
##   1.000   6.000   7.000   6.958   8.000  10.000
wilcox.test(Like$W,Like$V,alternative = "two.sided",paired = TRUE)
## 
##  Wilcoxon signed rank test with continuity correction
## 
## data:  Like$W and Like$V
## V = 2986, p-value = 0.6316
## alternative hypothesis: true location shift is not equal to 0