Документ с описанием импорта данных - http://rpubs.com/Petr001/454541
Документ с описательной статистикой - http://rpubs.com/Petr001/455155
Документ с описанием различий - http://rpubs.com/Petr001/DifferencesDLT
Проверка достоверности различий - http://rpubs.com/Petr001/CriteriaDifferencesDLT
date()
## [1] "Mon Jan 7 14:08:16 2019"
sessionInfo()
## R version 3.5.1 (2018-07-02)
## Platform: x86_64-apple-darwin15.6.0 (64-bit)
## Running under: macOS 10.14.2
##
## Matrix products: default
## BLAS: /Library/Frameworks/R.framework/Versions/3.5/Resources/lib/libRblas.0.dylib
## LAPACK: /Library/Frameworks/R.framework/Versions/3.5/Resources/lib/libRlapack.dylib
##
## locale:
## [1] en_US.UTF-8/en_US.UTF-8/en_US.UTF-8/C/en_US.UTF-8/en_US.UTF-8
##
## attached base packages:
## [1] stats graphics grDevices utils datasets methods base
##
## loaded via a namespace (and not attached):
## [1] compiler_3.5.1 backports_1.1.2 magrittr_1.5 rprojroot_1.3-2
## [5] tools_3.5.1 htmltools_0.3.6 yaml_2.2.0 Rcpp_1.0.0
## [9] stringi_1.2.4 rmarkdown_1.10 knitr_1.20 stringr_1.3.1
## [13] digest_0.6.15 evaluate_0.11
Загрузка данных и библиотек
library(ggplot2)
library(reshape2)
library(likert)
## Loading required package: xtable
load("Import.RData")
load("DecriptiveStatistics.RData")
table(df$Q3_DC1, df$Q5_DLT1, dnn = c("Автор курсов:", "Пользователь ДОТ:"))
## Пользователь ДОТ:
## Автор курсов: Да, использую Нет, не использую
## Да, являюсь 33 11
## Нет, не являюсь 33 18
Группы по включенности “Не включен” - Не включен в цифровизацию “Пользователь” - Курсы не разрабатывал, другие технологии не использую “Разработчик” - Разрабатывал курсы, другие технологии не использую “Разработчик и пользователь” - Разрабатывал курсы и использую другие технологии
!!!примечание мы не спрашивали про то, как преподаватель использует чужие дистанционные курсы. Мы спрашивал - является ли он автором курсов и использует ли он что-то еще другое.
df$Group <- NA
df$Group[(df$Q3_DC1 == "Нет, не являюсь") & (df$Q5_DLT1 == "Нет, не использую")] <- 1
df$Group[(df$Q3_DC1 == "Нет, не являюсь") & (df$Q5_DLT1 == "Да, использую")] <- 2
df$Group[(df$Q3_DC1 == "Да, являюсь") & (df$Q5_DLT1 == "Нет, не использую")] <- 3
df$Group[(df$Q3_DC1 == "Да, являюсь") & (df$Q5_DLT1 == "Да, использую")] <- 4
df$Group <- factor(df$Group, levels = c(1:4), labels = c(
"Не включен"
, "Пользователь"
, "Разработчик"
, "Разработчик и пользователь"))
table(df$Group)
##
## Не включен Пользователь
## 18 33
## Разработчик Разработчик и пользователь
## 11 33
dfGroup <- data.frame(Q3_DC1 = df$Q3_DC1, Q5_DLT1 = df$Q5_DLT1)
dfGroup$Group[(df$Q3_DC1 == "Нет, не являюсь") & (df$Q5_DLT1 == "Нет, не использую")] <- 1
dfGroup$Group[(df$Q3_DC1 == "Нет, не являюсь") & (df$Q5_DLT1 == "Да, использую")] <- 2
dfGroup$Group[(df$Q3_DC1 == "Да, являюсь") & (df$Q5_DLT1 == "Нет, не использую")] <- 3
dfGroup$Group[(df$Q3_DC1 == "Да, являюсь") & (df$Q5_DLT1 == "Да, использую")] <- 4
dfGroup$Group <- factor(dfGroup$Group, levels = c(1:4), labels = c(
"Не включен"
, "Пользователь"
, "Разработчик"
, "Разработчик и пользователь"))
Minurova$Q3_DC1 <- df$Q3_DC1
Minurova$Q5_DLT1 <- df$Q5_DLT1
Minurova$Group <- dfGroup$Group
ggplot(
melt(Minurova, id.vars = "Q3_DC1", measure.vars = c("Affection", "Stability", "Activity", "PriverzhSum"))
, aes(variable, value, col = Q3_DC1)) +
geom_boxplot()
## Warning: Removed 3 rows containing non-finite values (stat_boxplot).
ggplot(
melt(Minurova, id.vars = "Q5_DLT1", measure.vars = c("Affection", "Stability", "Activity", "PriverzhSum"))
, aes(variable, value, col = Q5_DLT1)) +
geom_boxplot()
## Warning: Removed 3 rows containing non-finite values (stat_boxplot).
ggplot(
melt(Minurova, id.vars = "Group", measure.vars = c("Affection", "Stability", "Activity", "PriverzhSum"))
, aes(variable, value, col = Group)) +
geom_boxplot()
## Warning: Removed 3 rows containing non-finite values (stat_boxplot).
ggplot(Minurova, aes(Affection)) +
geom_histogram(binwidth = 2
, fill = "white"
, col = "black") +
facet_grid(rows = vars(Q3_DC1), cols = vars(Q5_DLT1))
## Warning: Removed 1 rows containing non-finite values (stat_bin).
ggplot(Minurova, aes(Stability)) +
geom_histogram(binwidth = 2
, fill = "white"
, col = "black") +
facet_grid(rows = vars(Q3_DC1), cols = vars(Q5_DLT1))
## Warning: Removed 1 rows containing non-finite values (stat_bin).
ggplot(Minurova, aes(Activity)) +
geom_histogram(binwidth = 2
, fill = "white"
, col = "black") +
facet_grid(rows = vars(Q3_DC1), cols = vars(Q5_DLT1))
ggplot(Minurova, aes(PriverzhSum)) +
geom_histogram(binwidth = 5
, fill = "white"
, col = "black") +
facet_grid(rows = vars(Q3_DC1), cols = vars(Q5_DLT1))
## Warning: Removed 1 rows containing non-finite values (stat_bin).
melt_df <- melt(df, id.vars = c("Q3_DC1", "Q5_DLT1", "Group"), measure.vars = 22:57)
melt_df$value <- factor(melt_df$value, levels = c(
"Совершенно не согласен(на)"
, "Скорее не согласен(на), чем согласен(на)"
, "Скорее согласен(на), чем не согласен(на)"
, "Совершенно согласен(на)"
), ordered = TRUE) #нужно сделать порядковый фактор, чтобы сохранить последовательность ответов
ggplot(melt_df, aes(Q3_DC1, fill = value)) +
geom_bar(position = "fill"
#, width = 2
) +
coord_flip() +
facet_grid(rows = vars(variable)) +
theme(legend.position = "bottom")
ggplot(melt_df, aes(Q5_DLT1, fill = value)) +
geom_bar(position = "fill"
#, width = 2
) +
coord_flip() +
facet_grid(rows = vars(variable)) +
theme(legend.position = "bottom")
ggplot(melt_df, aes(Group, fill = value)) +
geom_bar(position = "fill") +
coord_flip() +
facet_grid(rows = vars(variable)) +
theme(legend.position = "bottom")
melt_df2 <- melt(df, id.vars = c("Q3_DC1", "Q5_DLT1", "Group"), measure.vars = 60:65)
melt_df2$value <- factor(melt_df2$value
, levels = c("Нет", "Трудно сказать", "Да")
, ordered = TRUE)
ggplot(melt_df2, aes(Q3_DC1, fill = value)) +
geom_bar(position = "fill") +
coord_flip() +
facet_grid(rows = vars(variable)) +
theme(legend.position = "bottom")
ggplot(melt_df2, aes(Q5_DLT1, fill = value)) +
geom_bar(position = "fill") +
coord_flip() +
facet_grid(rows = vars(variable)) +
theme(legend.position = "bottom")
ggplot(melt_df2, aes(Group, fill = value)) +
geom_bar(position = "fill") +
coord_flip() +
facet_grid(rows = vars(variable)) +
theme(legend.position = "bottom")
save(dfGroup, file = "Differences.RData")