Universidade Federal da Paraíba
Curso de Graduação em Economia
Análise Microeconômica I
options(OutDec=",")
w <- seq(0.5,3,length=100)
p <- seq(1.5,5,length=100)
# Definir função de demanda: f(L) = (beta*p/w)^(1/1-beta)
L <- function(W,P) {(0.5*P/W)^2}
# Definir função de oferta: Y = (beta*p/w)^(beta/1-beta)
Y <- function(W,P) {(0.5*P/W)}
# Desenhar gráfico
par(oma=c(0,1.8,0,0.8), mfrow=c(2,1))
plot(w,L(w,2),type="l",bty="l",cex.lab=0.8,cex.axis=0.8,col="blue",lwd=2,las=1,ylab=expression(L),xlab=expression(w),main="Demanda por Trabalho",
cex.main=0.8)
grid(col=grey(0.80))
points(w,L(w,4),type="l",col="blue",lwd=2,lty=2)
points(w,L(w,6),type="l",col="blue",lwd=2,lty=3)
plot(w,Y(mean(w),p),type="l",bty="l",cex.lab=0.8,cex.axis=0.8,col="red",lwd=2,las=1,ylab=expression(Y),xlab=expression(p),main="Oferta da Empresa",
cex.main=0.8)
par(fig=c(0, 1, 0, 1), oma=c(0, 0, 0, 0),mar=c(0, 0, 0, 0), new=TRUE)
plot(0,axes=F,xlab="",ylab="",col="transparent")
legend("topright",c(expression(p == 2),expression(p == 4),expression(p == 6)),
bty="n", lty =c(1,2,3),col=c(4,4,4),cex=0.9)