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(ggplot2)
library(descriptr)
library(knitr)
library(modeest)
library(fdth)
##
## Attaching package: 'fdth'
## The following object is masked from 'package:modeest':
##
## mfv
## The following objects are masked from 'package:stats':
##
## sd, var
library(readxl)
library(readxl)
Base_Estadistica_Descriptiva_2<-read_excel("Downloads/Base_Estadistica_Descriptiva-2.xlsx")
set.seed(61)
datos_p <- Base_Estadistica_Descriptiva_2
datos_p <- sample_n(Base_Estadistica_Descriptiva_2, size=160, replace= FALSE)
Porcentaje de hombres con Estudios Universitarios y cantidad total de mujeres participantes
hombres_total <- datos_p%>%filter(Genero =="Masculino")
hombres_uni <- hombres_total %>% filter(NivelEducativo == "Universitario")
aux <- table(datos_p$Genero, datos_p$NivelEducativo)
porcentajes_fila <- prop.table(aux, margin = 1) * 100
porcentaje_hombres_uni <- porcentajes_fila["Masculino", "Universitario"]
cat("El % de los hombres tiene estudios universitarios.", porcentaje_hombres_uni)
## El % de los hombres tiene estudios universitarios. 32.65306
total_mujeres <- nrow(filter(datos_p, Genero == "Femenino"))
cat("La cantidad total de mujeres participantes es:", total_mujeres, "\n")
## La cantidad total de mujeres participantes es: 59
#Pregunta 2 El grupo con mayor estatura promedio es “Otro”, seguido por los hombres, y finalmente las mujeres. Las diferencias no son extremas, pero la mediana claramente distingue niveles. No hay evidencia clara de outliers, y las estaturas están dentro de un rango saludable y razonablemente homogéneo.
boxplot(datos_p$Estatura ~ datos_p$Genero, xlab = "Género", ylab="Estatura", main = "Diagrama de caja y bigotes pregunta 2", col =c("deeppink", "goldenrod1", "pink"))
#3A TABLA DE FRECUENCIA
parcial1<- table(datos_p$Hermanos)
parcial1
##
## 0 1 2 3 4 5 6
## 34 14 15 24 26 21 26
barplot(parcial1, col = c("goldenrod1","deeppink","gold","pink"),
horiz=FALSE, density= NULL ,ylab= "Frecuencia absoluta" , border = TRUE,
ylim=c(0,40),xlab="Hermanos",main=" Gráfico de barras para Hermanos")
#3B
library(plotrix)
tablane <- table(datos_p$NivelEducativo)
pie3D(tablane, col = c("pink","gold","goldenrod1","deeppink"),
start=0, radius = 1.1,
explode=0, height=0.1
,labelcex = 1,theta=pi/3,
main="Diagrama de Torta",labels= c("Primaria",
"Secundaria", "Técnico", "Universitario"))
#3C #TABLA DE FREC
tabla1 <- fdt(datos_p$HorasDeTrabajo)
tabla_frec <- as.data.frame(tabla1$table)
colnames(tabla_frec) <- c("Intervalo", "Frecuencia", "Frecuencia Relativa",
"Frecuencia Acumulada", "Frecuencia Relativa Acumulada")
kable(tabla_frec, caption = "Tabla de frecuencia (horas de trabajo)")
Intervalo | Frecuencia | Frecuencia Relativa | Frecuencia Acumulada | Frecuencia Relativa Acumulada | NA |
---|---|---|---|---|---|
[16.137,21.549) | 7 | 0.04375 | 4.375 | 7 | 4.375 |
[21.549,26.96) | 14 | 0.08750 | 8.750 | 21 | 13.125 |
[26.96,32.372) | 14 | 0.08750 | 8.750 | 35 | 21.875 |
[32.372,37.784) | 31 | 0.19375 | 19.375 | 66 | 41.250 |
[37.784,43.195) | 29 | 0.18125 | 18.125 | 95 | 59.375 |
[43.195,48.607) | 40 | 0.25000 | 25.000 | 135 | 84.375 |
[48.607,54.019) | 18 | 0.11250 | 11.250 | 153 | 95.625 |
[54.019,59.43) | 4 | 0.02500 | 2.500 | 157 | 98.125 |
[59.43,64.842) | 3 | 0.01875 | 1.875 | 160 | 100.000 |
#histograma
tabla1 <- fdt(datos_p$HorasDeTrabajo)
tabla_frec <- as.data.frame(tabla1$table)
plot(tabla1, xlab = "Horas de Trabajo", ylab = "Frecuencia", col = "pink")
#POLIGONO DE FRECUENCIA
tabla1 <- fdt(datos_p$HorasDeTrabajo)
tabla_frec <- as.data.frame(tabla1$table)
plot(tabla1, type = "fp", xlab = "Horas de Trabajo", ylab = "Frecuencia", col = "gold")