library(RcmdrMisc)
## Carregando pacotes exigidos: car
## Carregando pacotes exigidos: carData
## Carregando pacotes exigidos: sandwich
.x <- seq(-3.291, 3.291, length.out=1000)
plotDistr(.x, dnorm(.x, mean=0, sd=1), cdf=FALSE, xlab="z", ylab="Densidade",regions=list(c(0, 4)), col=c('#0080C0', '#BEBEBE'), legend=FALSE)
plotDistr(.x, dnorm(.x, mean=0, sd=1), cdf=FALSE, xlab="z",
ylab="Densidade",regions=list(c(-1, 1)),
col=c('red'), legend=FALSE)
plotDistr(.x, dnorm(.x, mean=0, sd=1), cdf=FALSE, xlab="z",
ylab="Densidade",regions=list(c(-2, 2)),
col=c('green'), legend=FALSE)
plotDistr(.x, dnorm(.x, mean=0, sd=1), cdf=FALSE, xlab="z",
ylab="Densidade",regions=list(c(-3, 3)),
col=c('yellow'), legend=FALSE)
#—————————————————————–
plotDistr(.x, dnorm(.x, mean=0, sd=1), cdf=FALSE, xlab="z",
ylab="Densidade",regions=list(c(0, 1)),
col=c('skyblue'), legend=FALSE)
#—————————————————————–
plotDistr(.x, dnorm(.x, mean=0, sd=1), cdf=FALSE, xlab="z",
ylab="Densidade",regions=list(c(0, 2)),
col=c('darkblue'), legend=FALSE)
#—————————————————————–
plotDistr(.x, dnorm(.x, mean=0, sd=1), cdf=FALSE, xlab="z",
ylab="Densidade",regions=list(c(-3, 0),c(0,3)),
col=c('purple','yellow'), legend=FALSE)
#—————————————————————–
plotDistr(.x, dnorm(.x, mean=0, sd=1), cdf=FALSE, xlab="z",
ylab="Densidade",regions=list(c(-2, 0),c(0,2)),
col=c('red','blue'), legend=FALSE)
#—————————————————————– #—————————————————————– #—————————————————————–
plotDistr(.x, dnorm(.x, mean=0, sd=1), cdf=FALSE, xlab="z",
ylab="Densidade",regions=list(c(1,2)),
col=c('darkgreen'), legend=FALSE)
plotDistr(.x, dnorm(.x, mean=0, sd=1), cdf=FALSE, xlab="z",
ylab="Densidade",regions=list(c(0,1),c(1,2)),
col=c('red','darkgreen'), legend=FALSE)
#————————————————————
plotDistr(.x, dnorm(.x, mean=0, sd=1), cdf=FALSE, xlab="z",
ylab="Densidade",regions=list(c(2,3)),
col=c('black'), legend=FALSE)
plotDistr(.x, dnorm(.x, mean=0, sd=1), cdf=FALSE, xlab="z",
ylab="Densidade",regions=list(c(0,2),c(2,3)),
col=c('red','black'), legend=FALSE)
#———————————————————-
plotDistr(.x, dnorm(.x, mean=0, sd=1), cdf=FALSE, xlab="z",
ylab="Densidade",regions=list(c(-3,-2)),
col=c('orange'), legend=FALSE)
#———————————————————-
plotDistr(.x, dnorm(.x, mean=0, sd=1), cdf=FALSE, xlab="z",
ylab="Densidade",regions=list(c(-3,2)),
col=c('royalblue'), legend=FALSE)
plotDistr(.x, dnorm(.x, mean=0, sd=1), cdf=FALSE, xlab="z",
ylab="Densidade",regions=list(c(-3,0),c(0,2)),
col=c('darkblue','skyblue'), legend=FALSE)
#———————————————————-
plotDistr(.x, dnorm(.x, mean=0, sd=1), cdf=FALSE, xlab="z",
ylab="Densidade",regions=list(c(-2,0),c(0,1)),
col=c('red','blue'), legend=FALSE)
#———————————————————-
plotDistr(.x, dnorm(.x, mean=0, sd=1), cdf=FALSE, xlab="z",
ylab="Densidade",regions=list(c(0,1.34)),
col=c('darkred'), legend=FALSE)
#———————————————————-
plotDistr(.x, dnorm(.x, mean=0, sd=1), cdf=FALSE, xlab="z",
ylab="Densidade",regions=list(c(0,2.13)),
col=c('blue'), legend=FALSE)
#———————————————————-
#———————————————————-
plotDistr(.x, dnorm(.x, mean=0, sd=1), cdf=FALSE, xlab="z",
ylab="Densidade",regions=list(c(-2.01,0),c(0,1.17)),
col=c('red','blue'), legend=FALSE)