suppressMessages(library(ggplot2))
suppressMessages(library(dplyr))
suppressMessages(library(ggcorrplot))
suppressMessages(library(ggpubr))
= ("C:/Users/User/Desktop/MasterIndustriales/Ingenia/Datos_Neumaticos/Longitudinal")
dir_archivos setwd(dir_archivos)
="Hoosier_N3_Longitudinal_29.txt"
archivo_nombre= read.table(archivo_nombre, header=T, sep="",na.strings="")
dat
<- ggplot(dat, aes(x=FZ)) + geom_histogram()
ph1LO<- ggplot(dat, aes(x=P)) + geom_histogram()
ph2LO<- ggplot(dat, aes(x=IA)) + geom_histogram()
ph3LOggarrange(ph1LO,ph2LO,ph3LO)
## `stat_bin()` using `bins = 30`. Pick better value with `binwidth`.
## `stat_bin()` using `bins = 30`. Pick better value with `binwidth`.
## `stat_bin()` using `bins = 30`. Pick better value with `binwidth`.
# FZ [-800,-600]
# IA [4.05,3.95]
# P [100,90]
= filter(dat, dat$FZ >= -800 & dat$FZ <= -600 & dat$IA >= 3.95 & dat$IA <= 4.05 & dat$P >= 96 & dat$P <= 97)
x ggplot(x, aes(x=FZ), bins=30) + geom_histogram()
## `stat_bin()` using `bins = 30`. Pick better value with `binwidth`.
<- ggplot(data = x) +
p3LO geom_point(aes(y =FX/FZ , x = SR)) +
labs(title = "Hoosier 6.0 / 18.0 - 10 LCO") +
theme_bw()
<- max(x$FX/abs(x$FZ)) p3_valueLO
= ("C:/Users/User/Desktop/MasterIndustriales/Ingenia/Datos_Neumaticos/Longitudinal")
dir_archivos setwd(dir_archivos)
="Hoosier_N2_Longitudinal_42.txt"
archivo_nombre= read.table(archivo_nombre, header=T, sep="",na.strings="")
dat
<- ggplot(dat, aes(x=FZ)) + geom_histogram()
ph1LO<- ggplot(dat, aes(x=P)) + geom_histogram()
ph2LO<- ggplot(dat, aes(x=IA)) + geom_histogram()
ph3LOggarrange(ph1LO,ph2LO,ph3LO)
## `stat_bin()` using `bins = 30`. Pick better value with `binwidth`.
## `stat_bin()` using `bins = 30`. Pick better value with `binwidth`.
## `stat_bin()` using `bins = 30`. Pick better value with `binwidth`.
# FZ [-800,-600]
# IA [4.05,3.95]
# P [100,90]
= filter(dat, dat$FZ >= -800 & dat$FZ <= -600 & dat$IA >= 3.95 & dat$IA <= 4.05 & dat$P >= 96 & dat$P <= 97)
x ggplot(x, aes(x=FZ), bins=30) + geom_histogram()
## `stat_bin()` using `bins = 30`. Pick better value with `binwidth`.
<- ggplot(data = x) +
p2LO geom_point(aes(y =FX/FZ , x = SR)) +
labs(title = "Hoosier 20.5 x 7.0 - 13 R25B") +
theme_bw()
<- max(x$FX/abs(x$FZ)) p2_valueLO
= ("C:/Users/User/Desktop/MasterIndustriales/Ingenia/Datos_Neumaticos/Longitudinal")
dir_archivos setwd(dir_archivos)
="Hoosier_N1_Longitudinal_35.txt"
archivo_nombre= read.table(archivo_nombre, header=T, sep="",na.strings="")
dat
<- ggplot(dat, aes(x=FZ)) + geom_histogram()
ph1LO<- ggplot(dat, aes(x=P)) + geom_histogram()
ph2LO<- ggplot(dat, aes(x=IA)) + geom_histogram()
ph3LOggarrange(ph1LO,ph2LO,ph3LO)
## `stat_bin()` using `bins = 30`. Pick better value with `binwidth`.
## `stat_bin()` using `bins = 30`. Pick better value with `binwidth`.
## `stat_bin()` using `bins = 30`. Pick better value with `binwidth`.
# FZ [-800,-600]
# IA [4.05,3.95]
# P [100,90]
= filter(dat, dat$FZ >= -800 & dat$FZ <= -600 & dat$IA >= 3.95 & dat$IA <= 4.05 & dat$P >= 96 & dat$P <= 97)
x ggplot(x, aes(x=FZ), bins=30) + geom_histogram()
## `stat_bin()` using `bins = 30`. Pick better value with `binwidth`.
<- ggplot(data = x) +
p1LO geom_point(aes(y =FX/FZ , x = SR))+
labs(title = "Hoosier 6.0 / 18.0 - 10 LCO") +
theme_bw()
<- max(x$FX/abs(x$FZ)) p1_valueLO
= ("C:/Users/User/Desktop/MasterIndustriales/Ingenia/Datos_Neumaticos/Lateral")
dir_archivos setwd(dir_archivos)
= ("C:/Users/User/Desktop/MasterIndustriales/Ingenia/Datos_Neumaticos/Lateral")
dir_archivos setwd(dir_archivos)
="Hoosier_Lateral_N3_22.txt"
archivo_nombre= read.table(archivo_nombre, header=T, sep="",na.strings="")
dat
<- ggplot(dat, aes(x=FZ)) + geom_histogram()
ph1LA<- ggplot(dat, aes(x=P)) + geom_histogram()
ph2LA<- ggplot(dat, aes(x=IA)) + geom_histogram()
ph3LAggarrange(ph1LA,ph2LA,ph3LA)
## `stat_bin()` using `bins = 30`. Pick better value with `binwidth`.
## `stat_bin()` using `bins = 30`. Pick better value with `binwidth`.
## `stat_bin()` using `bins = 30`. Pick better value with `binwidth`.
# FZ[-1000,-1250]
# IA[-0.09,0.09]
# P [80, 100]
= filter(dat,dat$SR > -0.20 & dat$SR < 0.20 & dat$P >= 80 & dat$P <= 100 & dat$IA >= -0.09 & dat$IA <=0.09 & dat$FZ >= -1250 & dat$FZ <= -1000)
x <- ggplot(data = x) +
p3LA geom_point(aes(y =FY , x = SA)) +
labs(title = "Hoosier 6.0 / 18.0 - 10 LCO") +
theme_bw()
<- max(x$FX/abs(x$FZ)) p3_valueLA
= ("C:/Users/User/Desktop/MasterIndustriales/Ingenia/Datos_Neumaticos/Lateral")
dir_archivos setwd(dir_archivos)
="Hoosier_Lateral_N2_14.txt"
archivo_nombre= read.table(archivo_nombre, header=T, sep="",na.strings="")
dat
<- ggplot(dat, aes(x=FZ)) + geom_histogram()
ph1LA<- ggplot(dat, aes(x=P)) + geom_histogram()
ph2LA<- ggplot(dat, aes(x=IA)) + geom_histogram()
ph3LAggarrange(ph1LA,ph2LA,ph3LA)
## `stat_bin()` using `bins = 30`. Pick better value with `binwidth`.
## `stat_bin()` using `bins = 30`. Pick better value with `binwidth`.
## `stat_bin()` using `bins = 30`. Pick better value with `binwidth`.
# FZ[-1000,-1250]
# IA[-0.09,0.09]
# P [80, 100]
= filter(dat, dat$SR > -0.20 & dat$SR < 0.20 & dat$P >= 80 & dat$P <= 100 & dat$IA >= -0.09 & dat$IA <=0.09 & dat$FZ >= -1250 & dat$FZ <= -1000)
x <- ggplot(data = x) +
p2LA geom_point(aes(y =FY , x = SA)) +
labs(title = "Hoosier 20.5 x 7.0 - 13 R25B") +
theme_bw()
<- max(x$FX/abs(x$FZ)) p2_valueLA
= ("C:/Users/User/Desktop/MasterIndustriales/Ingenia/Datos_Neumaticos/Lateral")
dir_archivos setwd(dir_archivos)
="Hoosier_Lateral_N1_22.txt"
archivo_nombre= read.table(archivo_nombre, header=T, sep="",na.strings="")
dat
<- ggplot(dat, aes(x=FZ)) + geom_histogram()
ph1LA<- ggplot(dat, aes(x=P)) + geom_histogram()
ph2LA<- ggplot(dat, aes(x=IA)) + geom_histogram()
ph3LAggarrange(ph1LA,ph2LA,ph3LA)
## `stat_bin()` using `bins = 30`. Pick better value with `binwidth`.
## `stat_bin()` using `bins = 30`. Pick better value with `binwidth`.
## `stat_bin()` using `bins = 30`. Pick better value with `binwidth`.
# FZ[-1000,-1250]
# IA[-0.09,0.09]
# P [80, 100]
= filter(dat, dat$SR > -0.20 & dat$SR < 0.20 & dat$P >= 80 & dat$P <= 100 & dat$IA >= -1.5 & dat$IA <=2 & dat$FZ >= -1250 & dat$FZ <= -1000)
x <- ggplot(data = x) +
p1LA geom_point(aes(y =FY , x = SA)) +
labs(title = "Hoosier 18.0 x 7.5 10 R25B") +
theme_bw()
<- max(x$FX/abs(x$FZ)) p1_valueLA
ggarrange(p1LO,p2LO,p3LO)
ggarrange(p1LA,p2LA,p3LA)
<-c(p1_valueLO,p2_valueLO ,p3_valueLO)
maxLO <-c(p1_valueLA,p2_valueLA ,p3_valueLA)
maxLA
= data.frame(cbind(maxLO,maxLA))
maxLO_LA colnames(maxLO_LA ) = c("MAX_VALUE_SR_LONGITUDINAL","MAX_VALUE_SA_LATERAL")
rownames(maxLO_LA) = c("Hoosier 18.0 x 7.5 10 R25B","Hoosier 20.5 x 7.0 - 13 R25B","Hoosier 6.0 / 18.0 - 10 LCO")
En esta tabla se pueden observar y compar los diferentes máximos y mínimos de SR y SA en función de las caráteristicas de Fz, Ia y P establecidas. El neumático que mejor comportamiento tiene es Hoosier 18.0 x 7.5 10 R25B
maxLO_LA
## MAX_VALUE_SR_LONGITUDINAL MAX_VALUE_SA_LATERAL
## Hoosier 18.0 x 7.5 10 R25B 2.561132 0.10600114
## Hoosier 20.5 x 7.0 - 13 R25B 2.527532 0.08246950
## Hoosier 6.0 / 18.0 - 10 LCO 1.772489 0.07965197