head(datos, n = 8) |>
knitr::kable(caption = "Presento las primeras 8 filas de mi base de datos variable inev")
| grado | id_prov | sostenimiento | etnibee | inev | imat |
|---|---|---|---|---|---|
| 3 | Pastaza | Fiscomisional | Mestizo/Blanco | 719 | 686 |
| 3 | Pastaza | Fiscomisional | Mestizo/Blanco | 721 | 707 |
| 3 | Pastaza | Fiscomisional | Mestizo/Blanco | 706 | 683 |
| 3 | Pastaza | Fiscomisional | Mestizo/Blanco | 684 | 697 |
| 3 | Pastaza | Fiscomisional | Mestizo/Blanco | 699 | 691 |
| 3 | Pastaza | Fiscomisional | Mestizo/Blanco | 703 | 691 |
| 3 | Pastaza | Fiscomisional | Mestizo/Blanco | 717 | 707 |
| 3 | Pastaza | Fiscomisional | Mestizo/Blanco | 691 | 690 |
library(descriptr)
ds_summary_stats(datos,inev)
## -------------------------------- Variable: inev --------------------------------
##
## Univariate Analysis
##
## N 132.00 Variance 156.61
## Missing 0.00 Std Deviation 12.51
## Mean 690.61 Range 70.00
## Median 688.00 Interquartile Range 15.50
## Mode 688.00 Uncorrected SS 62977545.00
## Trimmed Mean 690.07 Corrected SS 20515.30
## Skewness 0.79 Coeff Variation 1.81
## Kurtosis 0.98 Std Error Mean 1.09
##
## Quantiles
##
## Quantile Value
##
## Max 738.00
## 99% 723.07
## 95% 713.35
## 90% 706.90
## Q3 697.25
## Median 688.00
## Q1 681.75
## 10% 676.10
## 5% 673.10
## 1% 669.00
## Min 668.00
##
## Extreme Values
##
## Low High
##
## Obs Value Obs Value
## 128 668 58 738
## 72 669 50 724
## 120 669 2 721
## 124 670 1 719
## 119 671 7 717
library(agricolae)
Histograma<-hist(datos$inev,breaks = 8,col = 5,probability = F,main = "Histograma inev",xlab = "Puntaje Global")
stem(datos$inev)
##
## The decimal point is 1 digit(s) to the right of the |
##
## 66 | 899
## 67 | 0112444
## 67 | 5556778889999
## 68 | 000001111122333344
## 68 | 555555666666677777888888888899
## 69 | 0001112222333444444
## 69 | 5555566778899
## 70 | 01223333344
## 70 | 556677788
## 71 | 22
## 71 | 5679
## 72 | 14
## 72 |
## 73 |
## 73 | 8
stripchart(datos$inev,main = "Diagrama de Puntos variable inev",xlab = "nota obtenida",col = "black")
Histograma<-hist(datos$inev,breaks = 8,col = 0,probability = F,main = "Poligono de Frecuencias",xlab = "nota obtenida")
lines(density(datos$inev),col="black",lwd=2)
polygon.freq(Histograma,col=4,frequency=1,lwd =2)
boxplot(datos$inev, main = "Diagrama de Caja variable inev",horizontal = T, ylab = "Valor ", col = "red", border = "black")
tabla_inev <- table(datos$inev)
pie(tabla_inev,
labels = names(tabla_inev),
col = rainbow(length(tabla_inev)),
main = "Distribución de inev")
library(descriptr)
ds_summary_stats(datos,imat)
## -------------------------------- Variable: imat --------------------------------
##
## Univariate Analysis
##
## N 132.00 Variance 34.14
## Missing 0.00 Std Deviation 5.84
## Mean 695.73 Range 37.00
## Median 697.00 Interquartile Range 6.00
## Mode 697.00 Uncorrected SS 63898673.00
## Trimmed Mean 695.42 Corrected SS 4471.72
## Skewness 1.09 Coeff Variation 0.84
## Kurtosis 2.73 Std Error Mean 0.51
##
## Quantiles
##
## Quantile Value
##
## Max 720.00
## 99% 713.00
## 95% 707.00
## 90% 700.00
## Q3 697.00
## Median 697.00
## Q1 691.00
## 10% 690.00
## 5% 689.00
## 1% 684.62
## Min 683.00
##
## Extreme Values
##
## Low High
##
## Obs Value Obs Value
## 3 683 58 720
## 104 684 15 713
## 1 686 50 713
## 57 686 82 713
## 62 686 12 709
#histograma datos imat
library(agricolae)
Histograma<-hist(datos$imat,breaks = 8,col = 5,probability = F,main = "Histograma imat",xlab = "Puntaje Global")
stem(datos$imat)
##
## The decimal point is at the |
##
## 682 | 0
## 684 | 0
## 686 | 0000
## 688 | 0000
## 690 | 00000000000000000000000000000000
## 692 |
## 694 | 00000000000000000
## 696 | 000000000000000000000000000000000000000000000
## 698 |
## 700 | 00000000000000000
## 702 | 0
## 704 |
## 706 | 00000
## 708 | 0
## 710 |
## 712 | 000
## 714 |
## 716 |
## 718 |
## 720 | 0
stripchart(datos$imat,main = "Diagrama de Puntos variable imat",xlab = "nota obtenida",col = "black")
Histograma<-hist(datos$imat,breaks = 8,col = 0,probability = F,main = "Poligono de Frecuencias",xlab = "nota obtenida")
lines(density(datos$imat),col="black",lwd=2)
polygon.freq(Histograma,col=4,frequency=1,lwd =2)
boxplot(datos$imat, main = "Diagrama de Caja variable imat",horizontal = T, ylab = "Valor ", col = "red", border = "black")
tabla_imat <- table(datos$imat)
pie(tabla_imat,
labels = names(tabla_imat),
col = rainbow(length(tabla_imat)),
main = "Distribución de imat")
summary(as.factor(datos$sostenimiento))
## Fiscal Fiscomisional
## 83 49
tabla_sost <- table(datos$sostenimiento)
pie(tabla_sost,
labels = names(tabla_sost),
col = rainbow(length(tabla_sost)),
main = "Distribución de sostenimiento")
barplot(tabla_sost,
col = rainbow(length(tabla_sost)),
main = "Gráfico de barras de sostenimiento",
ylab = "Frecuencia")
tabla_sost <- table(datos$sostenimiento)
names(tabla_sost)[which.max(tabla_sost)]
## [1] "Fiscal"
# Tabla de frecuencias
tabla_sostenimiento <- table(datos$sostenimiento)
tabla_sostenimiento
##
## Fiscal Fiscomisional
## 83 49
# Tabla de frecuencias
tabla_etnibee <- table(datos$etnibee)
tabla_etnibee
##
## Afroecuatoriano Indígena Mestizo/Blanco Otro
## 1 41 89 1
#MODA
# Moda (la categoría más frecuente)
names(tabla_etnibee)[which.max(tabla_etnibee)]
## [1] "Mestizo/Blanco"
# Porcentajes
prop.table(tabla_etnibee) * 100
##
## Afroecuatoriano Indígena Mestizo/Blanco Otro
## 0.7575758 31.0606061 67.4242424 0.7575758
# Gráfico de barras
barplot(tabla_etnibee,
col = rainbow(length(tabla_etnibee)),
main = "Gráfico de barras de etnibee",
ylab = "Frecuencia")
# Gráfico de pastel (pie chart)
pie(tabla_etnibee,
labels = names(tabla_etnibee),
col = rainbow(length(tabla_etnibee)),
main = "Distribución de etnibee")