Librerías

library(ggplot2)
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(readxl)

Datos

Los datos implican, bla, bla, bla

Notas 1: Significado

Notas 2: …

Notas 3: …

Notas 4: …

Finalmente, también se quiso tener en cuenta las nota final. Esta viene dada por el promedio de las cuatro notas de cada corte.

Notas=read_xlsx("Notas.xlsx")
Notas
## # A tibble: 26 × 6
##       ID `Nota corte N°1` `Nota corte N°2` `Nota corte N°3` `Nota corte N°4`
##    <dbl>            <dbl>            <dbl>            <dbl>            <dbl>
##  1     1             2.75              3.7              3.8              1.8
##  2     2             3.85              2                3.5              3.7
##  3     3             3.72              3.8              4.8              2.3
##  4     4             3.95              4.9              5                2.3
##  5     5             3.25              1.4              4.2              2.1
##  6     6             3.6               3.8              4.7              3.2
##  7     7             3.7               1.4              4.2              1.9
##  8     8             2.78              0.8              3.4              1  
##  9     9             3.9               4.9              5                0.4
## 10    10             3.65              3.3              4.7              1.2
## # ℹ 16 more rows
## # ℹ 1 more variable: `Nota final` <dbl>

Estadística notas 1

Medidas de tendencia central

## Notas corte 1 

 summary(Notas$`Nota corte N°1`)
##    Min. 1st Qu.  Median    Mean 3rd Qu.    Max. 
##   1.650   2.756   3.575   3.275   3.819   4.450

Desviación estándar

sd(Notas$`Nota corte N°1`)
## [1] 0.7059745

Generación gráficos - Notas corte 1

Diagrama de cajas y bigotes

ggplot(Notas, aes(x = factor(1), y = `Nota corte N°1`)) +
  geom_boxplot(width = 0.5, fill = "cadetblue4", color = "black", alpha=0.6) + 
  geom_point(aes(y = median(`Nota corte N°1`)), shape = 23, fill = "coral3", color = "black", size = 3) + 
  labs(x = "Notas primer corte)", y = "Notas") +
  scale_fill_manual(values = c("lightblue")) + 
  scale_color_manual(values = c("cadetblue", "coral")) + 
  theme_minimal()

Histograma de frecuencia

ggplot(data = data.frame(x = Notas$`Nota corte N°1`), aes(x))+ geom_histogram(fill = "lightslategray", alpha = 0.5, binwidth = 0.5, col='black') +
  geom_vline(aes(xintercept = mean(x), color = "Media"), linetype = "solid", size = 1) +
  geom_vline(aes(xintercept = median(x), color = "Mediana"), linetype = "solid", size = 1) +
  scale_color_manual(values = c(Media = "royalblue4", Mediana = "tomato3")) +
  labs(title = "Histograma de notas ", subtitle = "Frecuencia de notas del primer corte",x = "Nota", y = "Frecuencia de notas")+
  theme(plot.title=element_text(size=14, face='bold', color='darkslategray')) 
## Warning: Using `size` aesthetic for lines was deprecated in ggplot2 3.4.0.
## ℹ Please use `linewidth` instead.
## This warning is displayed once every 8 hours.
## Call `lifecycle::last_lifecycle_warnings()` to see where this warning was
## generated.

ggplot(data = data.frame(x = Notas$`Nota corte N°1`), aes(x))+ geom_density(fill = "lightslategray", alpha = 0.5) +
  geom_vline(aes(xintercept = mean(x), color = "Media"), linetype = "solid", size = 1) +
  geom_vline(aes(xintercept = median(x), color = "Mediana"), linetype = "solid", size = 1) +
  scale_color_manual(values = c(Media = "royalblue4", Mediana = "tomato3")) +
  labs(title = "Histograma de notas ", subtitle = "Frecuencia de notas del primer corte",x = "Nota", y = "Frecuencia de notas")+
  theme(plot.title=element_text(size=14, face='bold', color='darkslategray'))

Estadística notas 2

Medidas de tendencia central

## Notas corte 1 

 summary(Notas$`Nota corte N°2`)
##    Min. 1st Qu.  Median    Mean 3rd Qu.    Max. 
##   0.800   2.000   3.700   3.092   3.800   4.900

Desviación estándar

sd(Notas$`Nota corte N°2`)
## [1] 1.2781

Generación gráficos - Notas corte 2

Diagrama de cajas y bigotes

ggplot(Notas, aes(x = factor(1), y = `Nota corte N°2`)) +
  geom_boxplot(width = 0.5, fill = "cadetblue4", color = "black", alpha=0.6) + 
  geom_point(aes(y = median(`Nota corte N°2`)), shape = 23, fill = "coral3", color = "black", size = 3) + 
  labs(x = "Notas segundo corte)", y = "Notas") +
  scale_fill_manual(values = c("lightblue")) + 
  scale_color_manual(values = c("cadetblue", "coral")) + 
  theme_minimal()

Histograma de frecuencia

ggplot(data = data.frame(x = Notas$`Nota corte N°2`), aes(x))+ geom_histogram(fill = "lightslategray", alpha = 0.5, binwidth = 0.5, col='black') +
  geom_vline(aes(xintercept = mean(x), color = "Media"), linetype = "solid", size = 1) +
  geom_vline(aes(xintercept = median(x), color = "Mediana"), linetype = "solid", size = 1) +
  scale_color_manual(values = c(Media = "royalblue4", Mediana = "tomato3")) +
  labs(title = "Histograma de notas ", subtitle = "Frecuencia de notas del segundo corte",x = "Nota", y = "Frecuencia de notas")+
  theme(plot.title=element_text(size=14, face='bold', color='darkslategray')) 

Histograma de densidad

ggplot(data = data.frame(x = Notas$`Nota corte N°2`), aes(x))+ geom_density(fill = "lightslategray", alpha = 0.5) +
  geom_vline(aes(xintercept = mean(x), color = "Media"), linetype = "solid", size = 1) +
  geom_vline(aes(xintercept = median(x), color = "Mediana"), linetype = "solid", size = 1) +
  scale_color_manual(values = c(Media = "royalblue4", Mediana = "tomato3")) +
  labs(title = "Histograma de notas ", subtitle = "Frecuencia de notas del segundo corte",x = "Nota", y = "Frecuencia de notas")+
  theme(plot.title=element_text(size=14, face='bold', color='darkslategray'))

Estadística notas 3

Medidas de tendencia central

## Notas corte 1 

 summary(Notas$`Nota corte N°3`)
##    Min. 1st Qu.  Median    Mean 3rd Qu.    Max. 
##   3.400   3.800   4.200   4.258   4.800   5.000

Desviación estándar

sd(Notas$`Nota corte N°3`)
## [1] 0.5981124

Generación gráficos - Notas corte 3

Diagrama de cajas y bigotes

ggplot(Notas, aes(x = factor(1), y = `Nota corte N°3`)) +
  geom_boxplot(width = 0.5, fill = "cadetblue4", color = "black", alpha=0.6) + 
  geom_point(aes(y = median(`Nota corte N°3`)), shape = 23, fill = "coral3", color = "black", size = 3) + 
  labs(x = "Notas tercer corte", y = "Notas") +
  scale_fill_manual(values = c("lightblue")) + 
  scale_color_manual(values = c("cadetblue", "coral")) + 
  theme_minimal()

Histograma de frecuencia

ggplot(data = data.frame(x = Notas$`Nota corte N°3`), aes(x))+ geom_histogram(fill = "lightslategray", alpha = 0.5, binwidth = 0.5, col='black') +
  geom_vline(aes(xintercept = mean(x), color = "Media"), linetype = "solid", size = 1) +
  geom_vline(aes(xintercept = median(x), color = "Mediana"), linetype = "solid", size = 1) +
  scale_color_manual(values = c(Media = "royalblue4", Mediana = "tomato3")) +
  labs(title = "Histograma de notas ", subtitle = "Frecuencia de notas del tercer corte",x = "Nota", y = "Frecuencia de notas")+
  theme(plot.title=element_text(size=14, face='bold', color='darkslategray')) 

Histograma de densidad

ggplot(data = data.frame(x = Notas$`Nota corte N°3`), aes(x))+ geom_density(fill = "lightslategray", alpha = 0.5) +
  geom_vline(aes(xintercept = mean(x), color = "Media"), linetype = "solid", size = 1) +
  geom_vline(aes(xintercept = median(x), color = "Mediana"), linetype = "solid", size = 1) +
  scale_color_manual(values = c(Media = "royalblue4", Mediana = "tomato3")) +
  labs(title = "Histograma de notas ", subtitle = "Frecuencia de notas del tercer corte",x = "Nota", y = "Frecuencia de notas")+
  theme(plot.title=element_text(size=14, face='bold', color='darkslategray'))

Estadística notas 4

Medidas de tendencia central

## Notas corte 1 

 summary(Notas$`Nota corte N°4`)
##    Min. 1st Qu.  Median    Mean 3rd Qu.    Max. 
##   0.300   1.225   1.850   1.931   2.375   4.600

Desviación estándar

sd(Notas$`Nota corte N°4`)
## [1] 1.029473

Generación gráficos - Notas corte 4

Diagrama de cajas y bigotes

ggplot(Notas, aes(x = factor(1), y = `Nota corte N°4`)) +
  geom_boxplot(width = 0.5, fill = "cadetblue4", color = "black", alpha=0.6) + 
  geom_point(aes(y = median(`Nota corte N°4`)), shape = 23, fill = "coral3", color = "black", size = 3) + 
  labs(x = "Notas cuarto corte", y = "Notas") +
  scale_fill_manual(values = c("lightblue")) + 
  scale_color_manual(values = c("cadetblue", "coral")) + 
  theme_minimal()

Histograma de frecuencia

ggplot(data = data.frame(x = Notas$`Nota corte N°4`), aes(x))+ geom_histogram(fill = "lightslategray", alpha = 0.5, binwidth = 0.5, col='black') +
  geom_vline(aes(xintercept = mean(x), color = "Media"), linetype = "solid", size = 1) +
  geom_vline(aes(xintercept = median(x), color = "Mediana"), linetype = "solid", size = 1) +
  scale_color_manual(values = c(Media = "royalblue4", Mediana = "tomato3")) +
  labs(title = "Histograma de notas ", subtitle = "Frecuencia de notas del cuarto corte",x = "Nota", y = "Frecuencia de notas")+
  theme(plot.title=element_text(size=14, face='bold', color='darkslategray')) 

Histograma de densidad

ggplot(data = data.frame(x = Notas$`Nota corte N°4`), aes(x))+ geom_density(fill = "lightslategray", alpha = 0.5) +
  geom_vline(aes(xintercept = mean(x), color = "Media"), linetype = "solid", size = 1) +
  geom_vline(aes(xintercept = median(x), color = "Mediana"), linetype = "solid", size = 1) +
  scale_color_manual(values = c(Media = "royalblue4", Mediana = "tomato3")) +
  labs(title = "Histograma de notas ", subtitle = "Frecuencia de notas del cuarto corte",x = "Nota", y = "Frecuencia de notas")+
  theme(plot.title=element_text(size=14, face='bold', color='darkslategray'))