1 Alfa de Cronbach

1.1 Carga de base de datos ENCUESTA DE PERCEPCIÓN

ENCUESTA_73 <- read_excel("(V)ENCUESTA DE PERCEPCIÓN DE UN ENTORNO PERSONAL DE APRENDIZAJE (EPA) CON GEOGEBRA&nbsp;(1-73).xlsx", 
    sheet = "Hoja1")

ENCUESTA_73 = data.frame(ENCUESTA_73)

1.2 Head Base de datos

pander(head(ENCUESTA_73,5))
Table continues below
UAQ1 UAQ2 UAQ3 UAQ4 UAQ5 UAQ6 MEQ7 MEQ8 MEQ9 MEQ10 MEQ11
4 4 5 4 4 4 4 4 5 5 5
4 4 5 4 4 5 4 4 4 5 5
2 4 5 3 2 3 4 4 4 3 3
5 5 4 5 5 4 4 4 4 5 4
4 4 4 4 4 4 4 4 4 4 4
FCQ12 FCQ13 FCQ14 FCQ15 FCQ16 FCQ17 FCQ18
2 4 4 3 4 5 4
3 4 4 4 3 4 4
1 3 3 3 3 3 3
4 5 5 5 5 5 5
4 4 4 4 4 4 4

1.3 Dimensiones de evaluación

UA = ENCUESTA_73[c("UAQ1","UAQ2","UAQ3","UAQ4","UAQ5","UAQ6")]
ME = ENCUESTA_73[c("MEQ7","MEQ8","MEQ9","MEQ10","MEQ11")]
FC = ENCUESTA_73[c("FCQ12","FCQ13","FCQ14","FCQ15","FCQ16","FCQ17","FCQ18")]

UA = data.frame(UA)
ME = data.frame(ME)
FC = data.frame(FC)

1.4 Resultados del Coeficiente

if (!require(psych)) install.packages("psych")
## Loading required package: psych
library(psych)

ENCUESTA = alpha(ENCUESTA_73)
UU = alpha(UA)
MM = alpha(ME)
FF = alpha(FC)

ns = c("Encuesta")
coef = c(ENCUESTA$total$std.alpha)

tt = data.frame(ns,coef)
pander(tt)
ns coef
Encuesta 0.9215

1.5 Carga de base de datos PRUEBA DE COMPETENCIAS

PRUEBA_75_ <- read_excel("(V) PRUEBA DE COMPETENCIAS MATEMÁTICAS(1-75).xlsx", 
    sheet = "Hoja1")
PRUEBA_75_ = data.frame(PRUEBA_75_)

1.6 Head Base de datos

pander(head(PRUEBA_75_,5))
PFE1 PIR2 PA3 PFE4 PIR5 PA6 PA7 PA8 PIR9 PFE10
0 1 0 0 1 1 0 1 0 0
0 0 0 0 0 1 0 1 0 0
0 1 1 0 1 1 0 0 0 1
0 0 1 1 0 0 1 1 0 1
1 1 1 1 1 1 0 1 1 1

1.7 Dimensiones de evaluación

FE = PRUEBA_75_[c("PFE1","PFE4","PFE10")]
IR = PRUEBA_75_[c("PIR2","PIR5","PIR9")]
A = PRUEBA_75_[c("PA3","PA6","PA7","PA8")]

FE = data.frame(FE)
IR = data.frame(IR)
A = data.frame(A)

1.8 Resultados del Coeficiente

if (!require(psych)) install.packages("psych")
library(psych)

ENCUESTA = alpha(PRUEBA_75_)
FEE = alpha(FE)
IRR = alpha(IR)
AA = alpha(A)
## Warning in alpha(A): Some items were negatively correlated with the first principal component and probably 
## should be reversed.  
## To do this, run the function again with the 'check.keys=TRUE' option
## Some items ( PA8 ) were negatively correlated with the first principal component and 
## probably should be reversed.  
## To do this, run the function again with the 'check.keys=TRUE' option
ns = c("Encuesta")
coef = c(ENCUESTA$total$std.alpha)

tt = data.frame(ns,coef)
pander(tt)
ns coef
Encuesta 0.795