Este documento de trabajo se desarrolla para realizar un análisis descriptivo del comportamiento histórico de la materia dee Termodinámica en los programas de Ingeniería de la sede Antofagasta de nuestra Universidad y tratar de comprender la justificaciones de los rendimientos decrecientes.
Pendiente.
Para este estudio se ha extraido los resultados académicos de las inscripciones de la materia Termodinámica (DAIQ-00600) durante el periodo 2016 al 2021.
La estructura del dataframe es la siguiente:
library(readxl)
library(psych)
library(tidyverse)
## -- Attaching packages --------------------------------------- tidyverse 1.3.1 --
## v ggplot2 3.3.5 v purrr 0.3.4
## v tibble 3.1.4 v dplyr 1.0.7
## v tidyr 1.1.4 v stringr 1.4.0
## v readr 2.0.2 v forcats 0.5.1
## -- Conflicts ------------------------------------------ tidyverse_conflicts() --
## x ggplot2::%+%() masks psych::%+%()
## x ggplot2::alpha() masks psych::alpha()
## x dplyr::filter() masks stats::filter()
## x dplyr::lag() masks stats::lag()
library(ggplot2)
setwd("~/R files/Termodinamica")
Termodinamica <- read_excel("TERMODINAMICA.xlsx")
Termodinamica <- na.omit(Termodinamica)
str(Termodinamica)
## tibble [1,428 x 23] (S3: tbl_df/tbl/data.frame)
## $ SEDE : chr [1:1428] "ANTOFAGASTA" "ANTOFAGASTA" "ANTOFAGASTA" "ANTOFAGASTA" ...
## $ CODCARRERA : chr [1:1428] "8553" "8553" "8553" "8553" ...
## $ NOMBRECARRERA : chr [1:1428] "INGENIERÍA CIVIL EN QUÍMICA" "INGENIERÍA CIVIL EN QUÍMICA" "INGENIERÍA CIVIL EN QUÍMICA" "INGENIERÍA CIVIL EN QUÍMICA" ...
## $ RUT : chr [1:1428] "169813647" "181011920" "181254432" "181410612" ...
## $ NOMBRES : chr [1:1428] "EDDIE SCOTT" "BARBARA SOLEDAD" "DARIO EDUARDO" "VALENTINA FERNANDA" ...
## $ APELLIDOS : chr [1:1428] "RIVERA JIMÉNEZ" "ESPINOZA PINILLA" "PEÑA VILLALOBOS" "VILLALOBOS MONARDES" ...
## $ CATALOGO : chr [1:1428] "201610" "201610" "201610" "201610" ...
## $ PERIODO : chr [1:1428] "202020" "201710" "201620" "201720" ...
## $ NRC : chr [1:1428] "20999" "13185" "22955" "23384" ...
## $ PARALELO : chr [1:1428] "C1" "C1" "C3" "C2" ...
## $ MATERIACURSO : chr [1:1428] "DAIQ-00600" "DAIQ-00600" "DAIQ-00600" "DAIQ-00600" ...
## $ ASIGNATURA : chr [1:1428] "TERMODINÁMICA" "TERMODINÁMICA" "TERMODINÁMICA" "TERMODINÁMICA" ...
## $ RUT_PROFESOR : chr [1:1428] "180146431" "158117975" "172460569" "95015948" ...
## $ NOMBRES_PROFESOR : chr [1:1428] "ROBERTO IGNACIO" "LORETO DEL PILAR" "RODRIGO SEBASTIAN" "ELIZABETH JOHANNA" ...
## $ APELLIDOS_PROFESOR: chr [1:1428] "ROMERO PAPASIDERIS" "ARAYA VICENTELO" "HERNANDEZ FERNANDEZ" "LAM ESQUENAZI" ...
## $ PROFESOR : chr [1:1428] "ROBERTO IGNACIO ROMERO PAPASIDERIS" "LORETO DEL PILAR ARAYA VICENTELO" "RODRIGO SEBASTIAN HERNANDEZ FERNANDEZ" "ELIZABETH JOHANNA LAM ESQUENAZI" ...
## $ NOTA : chr [1:1428] "4,3" "4,2" "4,1" "3,1" ...
## $ NOTA_F : num [1:1428] 4.3 4.2 4.1 3.1 4.8 1 1 1.5 4.5 1.4 ...
## $ OPORTUNIDAD : num [1:1428] 1 1 1 1 1 1 2 1 1 1 ...
## $ PREREQ : chr [1:1428] "APROBADOS" "APROBADOS" "APROBADOS" "APROBADOS" ...
## $ INSCRIPCIONES : num [1:1428] 8 6 5 5 4 5 4 5 5 3 ...
## $ CREDITOS : num [1:1428] 35 30 25 25 18 16 19 25 20 15 ...
## $ AÑO : chr [1:1428] "2020" "2017" "2016" "2017" ...
## - attr(*, "na.action")= 'omit' Named int [1:2] 632 1190
## ..- attr(*, "names")= chr [1:2] "632" "1190"
summary(Termodinamica)
## SEDE CODCARRERA NOMBRECARRERA RUT
## Length:1428 Length:1428 Length:1428 Length:1428
## Class :character Class :character Class :character Class :character
## Mode :character Mode :character Mode :character Mode :character
##
##
##
## NOMBRES APELLIDOS CATALOGO PERIODO
## Length:1428 Length:1428 Length:1428 Length:1428
## Class :character Class :character Class :character Class :character
## Mode :character Mode :character Mode :character Mode :character
##
##
##
## NRC PARALELO MATERIACURSO ASIGNATURA
## Length:1428 Length:1428 Length:1428 Length:1428
## Class :character Class :character Class :character Class :character
## Mode :character Mode :character Mode :character Mode :character
##
##
##
## RUT_PROFESOR NOMBRES_PROFESOR APELLIDOS_PROFESOR PROFESOR
## Length:1428 Length:1428 Length:1428 Length:1428
## Class :character Class :character Class :character Class :character
## Mode :character Mode :character Mode :character Mode :character
##
##
##
## NOTA NOTA_F OPORTUNIDAD PREREQ
## Length:1428 Min. :1.00 Min. :1.000 Length:1428
## Class :character 1st Qu.:3.40 1st Qu.:1.000 Class :character
## Mode :character Median :4.40 Median :1.000 Mode :character
## Mean :4.18 Mean :1.198
## 3rd Qu.:5.10 3rd Qu.:1.000
## Max. :7.00 Max. :4.000
## INSCRIPCIONES CREDITOS AÑO
## Min. : 2.000 Min. :10.00 Length:1428
## 1st Qu.: 5.000 1st Qu.:23.00 Class :character
## Median : 6.000 Median :27.00 Mode :character
## Mean : 5.653 Mean :26.34
## 3rd Qu.: 7.000 3rd Qu.:30.00
## Max. :11.000 Max. :45.00
# Generacion de Boxplots para ver el camportamiento anual de la materia desde la perspectiva de Nota
ggplot(Termodinamica, aes ( x = AÑO, y = NOTA_F))+
geom_boxplot(outlier.shape = NA)+
geom_jitter(width = 0.2, color = 4)+
stat_summary(fun=mean, geom="point", shape=25, size=3, color="black", fill="red")+
labs(title = "Boxplots y dispersión de Notas por Año",
x = "Año de Dictación",
y = "Nota Final",
caption = "(Basado en los registros de Notas Finales por Semestre)")
# Generacion de Boxplots para ver el camportamiento anual de la materia desde la perspectiva de Nota
ggplot(Termodinamica, aes ( x = PERIODO, y = NOTA_F))+
geom_boxplot(outlier.shape = NA)+
geom_jitter(width = 0.2, color = 4)+
stat_summary(fun=mean, geom="point", shape=25, size=3, color="black", fill="red")+
labs(title = "Boxplots y dispersión de Notas por Semestre",
x = "Año de Dictación",
y = "Nota Final",
caption = "(Basado en los registros de Notas Finales por Semestre)")
# Generacion es Boxplots para ver el camportamiento anual de la materia desde la perspectiva del Académico
ggplot(Termodinamica, aes ( x = NOTA_F, y = PROFESOR))+
geom_boxplot(outlier.shape = NA)+
geom_jitter(width = 0.2, color = 4)+
stat_summary(fun.y=mean, geom="point", shape=25, size=3, color="black", fill="red")+
labs(title = "Boxplots y dispersión de Notas por Profesor",
x = "Nota Final",
y = "Profesor",
caption = "(Basado en los registros de Notas Finales por Semestre)")
## Warning: `fun.y` is deprecated. Use `fun` instead.
ggplot(Termodinamica, aes ( x = NOTA_F))+
geom_histogram(aes(y=..density..), colour="black", fill="white")+
geom_density(alpha=.2, fill="#FF6666")+
facet_wrap(~NOMBRECARRERA)+
labs(title = "Histogramas por Carrera",
x = "Nota Final",
y = "Densidad",
caption = "(Basado en los registros de Notas Finales por Semestre)")
## `stat_bin()` using `bins = 30`. Pick better value with `binwidth`.
ggplot(Termodinamica, aes ( x = NOTA_F, y = NOMBRECARRERA, color = CODCARRERA))+
geom_boxplot(outlier.shape = NA)+
geom_jitter()+
stat_summary(fun=mean, geom="point", shape=25, size=3, color="black", fill="red")+
labs(title = "Boxplots y dispersión de Notas por Carrera",
x = "Nota Final",
y = "Carrera",
caption = "(Basado en los registros de Notas Finales por Semestre)")
ggplot(Termodinamica, aes ( x =OPORTUNIDAD))+
geom_histogram(bins = 4)+
labs(title = "Histogramas por Carrera",
x = "Oportunidad de Inscripción",
y = "Total",
caption = "(Basado en los registros de Notas Finales por Semestre)")+
facet_wrap(~NOMBRECARRERA)
ggplot(Termodinamica, aes ( x = AÑO, y = NOTA_F))+
geom_boxplot(outlier.shape = NA)+
geom_jitter(width = 0.2, color = 4)+
stat_summary(fun=mean, geom="point", shape=25, size=3, color="black", fill="red")+
labs(title = "Boxplots y dispersión de Notas por Año",
x = "Año de Dictación",
y = "Nota Final",
caption = "(Basado en los registros de Notas Finales por Semestre)")+
facet_wrap(~PREREQ)
ggplot(Termodinamica, aes ( x = AÑO, y = NOTA_F))+
geom_boxplot(outlier.shape = NA)+
geom_jitter(width = 0.2, color = 4, size = 1)+
stat_summary(fun=mean, geom="point", shape=25, size=2, color="black", fill="red")+
theme(axis.text.x = element_text(size =5))+
theme(text = element_text(size =8))+
labs(title = "Boxplots y dispersión de Notas por Año",
x = "Año de Dictación",
y = "Nota Final",
caption = "(Basado en los registros de Notas Finales por Semestre)")+
facet_grid(APELLIDOS_PROFESOR~NOMBRECARRERA)