Библиотеки
library(reshape2)
library(ggplot2)
library(stringr)
D1 - Рефлексия на морально-этические ситуации (моральная рефлексия или рефлексия актуализирующаяся в ситуациях связанных с морально-этическими коллизиями и конфликтами).
D2 - Интуиция в морально-этической сфере (нравственная интуиция).
D3 - Экзистенциальный аспект ответственности.
D4 - Альтруистические эмоции.
D5 - Морально-этические ценности.
D0 - уровень сформированности морально-этической ответственности
M1 - Забота
M2 - Справедливость
M3 - Лояльность
M4 - Уважение
M5 - Чистота
K1 - Отрицание экологических проблем
K2 - Экологическая интернальность
K3 - Биоцентризм
K4 - «Деньги» (шкала финансово-экономических приоритетов)
K0 - Общий показатель озабоченности глобальными экологическими проблемами
Импорт таблицы
Data <- read.csv2("../Moral.csv")
Data$Name <- paste0(str_sub(Data$Name, 1, 3), str_sub(Data$Name, -1, -1))
Data$Gender <- as.factor(Data$Gender)
NamesData <- names(Data)
ggplot(Data, aes(x = K0, y = D1, col = Gender)) +
geom_point() +
geom_smooth(method = 'lm')
## `geom_smooth()` using formula 'y ~ x'
ggplot(Data, aes(x = K0, y = D2, col = Gender)) +
geom_point() +
geom_smooth(method = 'lm')
## `geom_smooth()` using formula 'y ~ x'
ggplot(Data, aes(x = K0, y = D3, col = Gender)) +
geom_point() +
geom_smooth(method = 'lm')
## `geom_smooth()` using formula 'y ~ x'
ggplot(Data, aes(x = K0, y = D4, col = Gender)) +
geom_point() +
geom_smooth(method = 'lm')
## `geom_smooth()` using formula 'y ~ x'
ggplot(Data, aes(x = K0, y = D5, col = Gender)) +
geom_point() +
geom_smooth(method = 'lm')
## `geom_smooth()` using formula 'y ~ x'
ggplot(Data, aes(x = K0, y = D6, col = Gender)) +
geom_point() +
geom_smooth(method = 'lm')
## `geom_smooth()` using formula 'y ~ x'
ggplot(Data, aes(x = K0, y = D0, col = Gender)) +
geom_point() +
geom_smooth(method = 'lm')
## `geom_smooth()` using formula 'y ~ x'
ggplot(Data, aes(x = K0, y = M1, col = Gender)) +
geom_point() +
geom_smooth(method = 'lm')
## `geom_smooth()` using formula 'y ~ x'
ggplot(Data, aes(x = K0, y = M2, col = Gender)) +
geom_point() +
geom_smooth(method = 'lm')
## `geom_smooth()` using formula 'y ~ x'
ggplot(Data, aes(x = K0, y = M3, col = Gender)) +
geom_point() +
geom_smooth(method = 'lm')
## `geom_smooth()` using formula 'y ~ x'
ggplot(Data, aes(x = K0, y = M4, col = Gender)) +
geom_point() +
geom_smooth(method = 'lm')
## `geom_smooth()` using formula 'y ~ x'
ggplot(Data, aes(x = K0, y = M5, col = Gender)) +
geom_point() +
geom_smooth(method = 'lm')
## `geom_smooth()` using formula 'y ~ x'
facet
meltData <- melt(Data
, id.vars = c("Name", "Gender", "K0")
, measure.vars = 9:13)
head(meltData)
## Name Gender K0 variable value
## 1 Пот5 m 3 M1 15
## 2 Бел5 f 27 M1 16
## 3 Чен1 f 1 M1 13
## 4 Ант4 m 32 M1 16
## 5 Ли 1 f 12 M1 19
## 6 Ли 3 f 0 M1 18
ggplot(meltData, aes(x = K0, y = value, col = Gender)) +
geom_point() +
geom_smooth(method = 'lm') +
facet_grid(cols = vars(variable))
## `geom_smooth()` using formula 'y ~ x'