Bienvenidos al evento institucional un día como profesional. Sabes qué hace un Ingeniero Estadístico
Mira lo que dice un buscador
https://www.mymajors.com/career/statistical-engineer/education/.
http://guide.berkeley.edu/undergraduate/degree-programs/engineering-math-statistics/
https://www.unanleon.edu.ni/fac/ct/ing_estadistica.html
https://www.universidades.com.ec/universidad-central-del-ecuador/ingenieria-en-estadistica
https://www.escuelaing.edu.co/es/programas/ingenieria-estadistica/
http://ec2-54-144-134-190.compute-1.amazonaws.com:8050/apps/home
https://bbc.github.io/rcookbook/
library(maps)
# No margin
par(mar=c(0,0,0,0))
# World map
map('world',
col="#f2f2f2", fill=TRUE, bg="white", lwd=0.1,
mar=rep(0,4),border=1, ylim=c(-100,100)
)
# Dplyr for data wrangling and pipe function
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
# Cities
Chile <- c(-70,-28)
USA <- c(-118,38)
Colombia <- c(-70,5)
Ecuador <- c(-80,0)
Perú <- c(-75, -5)
# Data frame
data <- rbind(Chile, USA, Colombia, Ecuador, Perú) %>%
as.data.frame()
colnames(data) <- c("long","lat")
points(x=data$long, y=data$lat, col="slateblue", cex=2, pch=20)
#Conectings
library(geosphere)
# Background map
# Dot for cities
points(x=data$long, y=data$lat, col="slateblue", cex=3, pch=20)
# Compute the connection between USA and Colombia
inter <- gcIntermediate(USA, Colombia, n=50, addStartEnd=TRUE, breakAtDateLine=F)
# Show this connection
lines(inter, col="slateblue", lwd=2)
# Between Colombia and Ecuador
inter <- gcIntermediate(Colombia, Ecuador, n=50, addStartEnd=TRUE, breakAtDateLine=F)
lines(inter, col="slateblue", lwd=2)
# Between Perú and Chile
inter <- gcIntermediate(Perú, Chile, n=50, addStartEnd=TRUE, breakAtDateLine=F)
lines(inter, col="slateblue", lwd=2)
# Between Colombia and UE
inter <- gcIntermediate(Colombia, c(2,49), n=50, addStartEnd=TRUE, breakAtDateLine=F)
lines(inter, col="slateblue", lwd=2)
# Between Colombia and Australia
inter <- gcIntermediate(Colombia, c(145,-28), n=50, addStartEnd=TRUE, breakAtDateLine=F)
lines(inter, col="slateblue", lwd=2)