Funções Com Assíntotas #2
f <- function(x){1/(x-1)
}
x <- seq(-5,5, by=0.01)
plot(x, f(x),
col = "red",
lwd = 2,
type="l",
panel.first = grid (20, 20 , lty = 1, lwd = 1),
xlim = c(-1,2),
ylim = c(-20,20),
main = bquote("Gráfico da Função"),
xlab = "Valores de x",
ylab = "Valores de y")
abline(h=0, v=0, col = "blue")
mtext("Produzido por Renan Miranda", 4, 0.7)
#--------PONTO (0,0) NO PLANO CARTESIANO--------#
x <- c(0)
y <- c(0)
points(x, y, pch = 20, col ="black")
text (x + 0.09, y + 1, paste( x ), col = "blue")
#-----"RETA NA COR VERDE ESCURO (ASSÍNTOTA)"---------#
#------------VERTICAL-------------------#
g <- c(1.0, 1.0)
h <- c(10.0, -10.0)
lines(g, h, lty = 1, lwd = 2, col = "darkgreen")
text(0.85, 2.6, expression(x == 1), col = "darkgreen")

# Se a gente olhar com calma a medida que o valor de y aumenta (sendo y positivo ou negativo) a função tende a tocar na reta x=1, mas ela nunca toca!
# Logo, a reta X=1 é nossa assíntota vertical.
Funções Com Assíntotas #3
f <- function(x){(3*x) / (x-1)
}
curve(f, from = -5,
to = 5,
col = "red",
lwd = 2,
panel.first = grid (20, 20 , lty = 1, lwd = 1),
xlim = c(-4,4),
ylim = c(-15,15),
main = bquote("Gráfico da Função"),
xlab = "Valores de x",
ylab = "Valores de y")
abline(h=0, v=0, col = "blue")
mtext("Produzido por Renan Miranda", 4, 0.7)
#--------PONTO (0,0) NO PLANO CARTESIANO--------#
x <- c(0)
y <- c(0)
points(x, y, pch = 20, col ="black")
text (x - 0.2, y - 1, paste( x ), col = "blue")
#-----"RETA NA COR VERDE ESCURO (ASSÍNTOTA)"---------#
#------------VERTICAL-------------------#
g <- c(1.0, 1.0)
h <- c(16.0, -16.0)
lines(g, h, lty = 1, lwd = 2, col = "darkgreen")
text(1.3, -2.6, expression(x == 1), col = "darkgreen")
#-----------HORIZONTAL---------------#
i <- c(10.0, -10.0)
j <- c(3.0, 3.0)
lines(i, j, lty = 1, lwd = 2, col = "purple")
text(-1.3, 4.5, expression(y == 3), col = "purple")

# Neste caso temos duas assintotas, uma na vertical (reta x = 1) e uma na horizontal (reta y = 3).
Funções Trigonométricas (seno) #1
f <- function(x){ sin(x)
}
curve(f, from = -11,
to = 11,
col = "red",
lwd = 2,
panel.first = grid (20, 20 , lty = 1, lwd = 1),
xlim = c(-10,10),
ylim = c(-4,4),
main = bquote("Gráfico da Função"),
xlab = "Valores de x",
ylab = "Valores de y")
legend("topleft",c("sen(x)"),fill=c("red"))
abline(h=0, v=0, col = "blue")
mtext("Produzido por Renan Miranda", 4, 0.7)
#--------PONTO (0,0) NO PLANO CARTESIANO--------#
x <- c(0)
y <- c(0)
points(x, y, pch = 20, col ="black")
text (x + 0.5, y - 0.5, paste( x ), col = "blue")
#-----"RETA NA COR VERDE ESCURO"---------#
#-----------HORIZONTAL---------------#
i <- c(11.0, -11.0)
j <- c(1.0, 1.0)
lines(i, j, lty = 3, lwd = 2, col = "purple")
#-----------HORIZONTAL---------------#
i <- c(11.0, -11.0)
j <- c(-1.0, -1.0)
lines(i, j, lty = 3, lwd = 2, col = "purple")

# Como sabemos que o seno de algum número está definido exclusivamente entre -1 e 1, repare que no gráfico, para qualquer valor de x, seu respectivo seno (valor de y) nuna ultrapssa os valores de -1 e 1.
Funções Trigonométricas (seno) #2
f <- function(x){ sin(2*x)
}
curve(f, from = -11,
to = 11,
col = "red",
lwd = 2,
panel.first = grid (20, 20 , lty = 1, lwd = 1),
xlim = c(-10,10),
ylim = c(-4,4),
main = bquote("Gráfico da Função"),
xlab = "Valores de x",
ylab = "Valores de y")
legend("topleft",c("sen(2x)"),fill=c("red"))
abline(h=0, v=0, col = "blue")
mtext("Produzido por Renan Miranda", 4, 0.7)
#--------PONTO (0,0) NO PLANO CARTESIANO--------#
x <- c(0)
y <- c(0)
points(x, y, pch = 20, col ="black")
text (x + 0.5, y - 0.5, paste( x ), col = "blue")
#-----"RETA NA COR VERDE ESCURO"---------#
#-----------HORIZONTAL---------------#
i <- c(11.0, -11.0)
j <- c(1.0, 1.0)
lines(i, j, lty = 3, lwd = 2, col = "purple")
#-----------HORIZONTAL---------------#
i <- c(11.0, -11.0)
j <- c(-1.0, -1.0)
lines(i, j, lty = 3, lwd = 2, col = "purple")

# O gráfico de sen(2x) é parecido com o de sen(x). Os resultados (valores de y) continuam não ultrapassando -1 e 1. Porém, como temos agora 2x ao invés de x, as ondas se encurtam, e continuam se encurtanto cada vez mais na medida em que aumentamos o valor do multiplicador de x.
Funções Trigonométricas (seno) #3
f <- function(x){ sin(1/2*x)
}
curve(f, from = -11,
to = 11,
col = "red",
lwd = 2,
panel.first = grid (20, 20 , lty = 1, lwd = 1),
xlim = c(-10,10),
ylim = c(-4,4),
main = bquote("Gráfico da Função"),
xlab = "Valores de x",
ylab = "Valores de y")
legend("topleft",c("sin(1/2x)"),fill=c("red"))
abline(h=0, v=0, col = "blue")
mtext("Produzido por Renan Miranda", 4, 0.7)
#--------PONTO (0,0) NO PLANO CARTESIANO--------#
x <- c(0)
y <- c(0)
points(x, y, pch = 20, col ="black")
text (x + 0.5, y - 0.5, paste( x ), col = "blue")
#-----"RETA NA COR VERDE ESCURO"---------#
#-----------HORIZONTAL---------------#
i <- c(11.0, -11.0)
j <- c(1.0, 1.0)
lines(i, j, lty = 3, lwd = 2, col = "purple")
#-----------HORIZONTAL---------------#
i <- c(11.0, -11.0)
j <- c(-1.0, -1.0)
lines(i, j, lty = 3, lwd = 2, col = "purple")

# Agora temos um multiplicador de x menor entre 0 e 1. Como vimos, um multiplicador maior que 1 as ondas se encurtam e vemos então que um entre 0 e 1 as ondas se alargam na medida ele fica próximo ao 0.
Funções Trigonométricas (seno) #4
f <- function(x){ 2*sin(x)
}
curve(f, from = -11,
to = 11,
col = "red",
lwd = 2,
panel.first = grid (20, 20 , lty = 1, lwd = 1),
xlim = c(-10,10),
ylim = c(-4,4),
main = bquote("Gráfico da Função"),
xlab = "Valores de x",
ylab = "Valores de y")
legend("topleft",c("2sen(x)"),fill=c("red"))
abline(h=0, v=0, col = "blue")
mtext("Produzido por Renan Miranda", 4, 0.7)
#--------PONTO (0,0) NO PLANO CARTESIANO--------#
x <- c(0)
y <- c(0)
points(x, y, pch = 20, col ="black")
text (x + 0.5, y - 0.5, paste( x ), col = "blue")
#-----"RETA NA COR VERDE ESCURO"---------#
#-----------HORIZONTAL---------------#
i <- c(11.0, -11.0)
j <- c(2.0, 2.0)
lines(i, j, lty = 3, lwd = 2, col = "purple")
#-----------HORIZONTAL---------------#
i <- c(11.0, -11.0)
j <- c(-2.0, -2.0)
lines(i, j, lty = 3, lwd = 2, col = "purple")

# Agora temos a Função sen(x) multiplicada por 2. Diferentemente do exemplo dado (sen(2x)), não multiplicaremos o valor de x por 2 e depois calcular o seno. Calcularemos o seno e depois multiplicaremos por 2, logo, os valores de y variam de -2 a 2 e assim sucessivamente, variando de acordo com o numero multiplicado. Por exemplo, 3sen(x) variará de -3 a 3.
Funções Trigonométricas (seno) #5
f <- function(x){ 2*sin(2*x)
}
plot(f, from = -11,
to = 11,
col = "red",
lwd = 2,
panel.first = grid (20, 20 , lty = 1, lwd = 1),
xlim = c(-10,10),
ylim = c(-4,4),
main = bquote("Gráfico da Função"),
xlab = "Valores de x",
ylab = "Valores de y")
legend("topright",legend =expression(2*sin(2*x)),
col=c("red"), lty = 1, lwd = 2)
abline(h=0, v=0, col = "blue")
mtext("Produzido por Renan Miranda", 4, 0.7)
#--------PONTO (0,0) NO PLANO CARTESIANO--------#
x <- c(0)
y <- c(0)
points(x, y, pch = 20, col ="black")
text (x + 0.5, y - 0.5, paste( x ), col = "blue")
#-----"RETA NA COR VERDE ESCURO"---------#
#-----------HORIZONTAL---------------#
i <- c(11.0, -11.0)
j <- c(2.0, 2.0)
lines(i, j, lty = 3, lwd = 2, col = "purple")
#-----------HORIZONTAL---------------#
i <- c(11.0, -11.0)
j <- c(-2.0, -2.0)
lines(i, j, lty = 3, lwd = 2, col = "purple")

# Seguindo todos os raciocínios vistos 2sen(2x) também varia de -2 a 2 com as ondas encurtadas e a medida que multiplicamos x por um valor maior, as onde vão se encurtando cada vez mais. Já por um valor entre 0 e 1 as ondas se alargam. Lembramdo que isso sempre variando de -2 a 2.
Funções Trigonométricas (seno) #6
f <- function(x){ 1/2*sin(x)
}
curve(f, from = -11,
to = 11,
col = "red",
lwd = 2,
panel.first = grid (20, 20 , lty = 1, lwd = 1),
xlim = c(-10,10),
ylim = c(-2,2),
main = bquote("Gráfico da Função"),
xlab = "Valores de x",
ylab = "Valores de y")
legend("topleft",c("1/2sen(x)"),fill=c("red"))
abline(h=0, v=0, col = "blue")
mtext("Produzido por Renan Miranda", 4, 0.7)
#--------PONTO (0,0) NO PLANO CARTESIANO--------#
x <- c(0)
y <- c(0)
points(x, y, pch = 20, col ="black")
text (x + 0.5, y - 0.2, paste( x ), col = "blue")
#-----"RETA NA COR VERDE ESCURO"---------#
#-----------HORIZONTAL---------------#
i <- c(11.0, -11.0)
j <- c(0.5, 0.5)
lines(i, j, lty = 3, lwd = 2, col = "purple")
#-----------HORIZONTAL---------------#
i <- c(11.0, -11.0)
j <- c(-0.5, -0.5)
lines(i, j, lty = 3, lwd = 2, col = "purple")

# Quando multiplicamos o resultado de sen(x) por um número acima de 1, o intervalo dos valores de y aumentam. Porém agora multiplicando por um número entre 0 e 1 o intervalo dos valores de y ficam menor. No exemplo em questão multiplicando por 1/2, os resultados variam de -1/2 a 1/2.
Funções Trigonométricas (seno) #7
f <- function(x){ -sin(x)
}
curve(f, from = -11,
to = 11,
col = "red",
lwd = 2,
panel.first = grid (20, 20 , lty = 1, lwd = 1),
xlim = c(-10,10),
ylim = c(-4,4),
main = bquote("Gráfico da Função"),
xlab = "Valores de x",
ylab = "Valores de y")
legend("topleft",c("-sen(x)"),fill=c("red"))
abline(h=0, v=0, col = "blue")
mtext("Produzido por Renan Miranda", 4, 0.7)
#--------PONTO (0,0) NO PLANO CARTESIANO--------#
x <- c(0)
y <- c(0)
points(x, y, pch = 20, col ="black")
text (x + 0.3, y - 0.5, paste( x ), col = "blue")
#-----"RETA NA COR VERDE ESCURO"---------#
#-----------HORIZONTAL---------------#
i <- c(11.0, -11.0)
j <- c(1.0, 1.0)
lines(i, j, lty = 3, lwd = 2, col = "purple")
#-----------HORIZONTAL---------------#
i <- c(11.0, -11.0)
j <- c(-1.0, -1.0)
lines(i, j, lty = 3, lwd = 2, col = "purple")

# Tratando agora de valores negativos, temos o número -1, subentendido, multiplicando o valor de sen(x). A princípio o gráfico de sen(x) e o de -sen(x) parecem iguais, mas não são. Veja novamente o gráfico de sen(x):
f2 <- function(x){ sin(x)
}
curve(f2, from = -11,
to = 11,
col = "darkgreen",
lwd = 2,
panel.first = grid (20, 20 , lty = 1, lwd = 1),
xlim = c(-10,10),
ylim = c(-4,4),
main = bquote("Gráfico da Função"),
xlab = "Valores de x",
ylab = "Valores de y")
legend("topleft",c("sen(x)"),fill=c("red"))
abline(h=0, v=0, col = "blue")
mtext("Produzido por Renan Miranda", 4, 0.7)
#--------PONTO (0,0) NO PLANO CARTESIANO--------#
x <- c(0)
y <- c(0)
points(x, y, pch = 20, col ="black")
text (x + 0.3, y - 0.5, paste( x ), col = "blue")

# Agora veja os gráficos de -sen(x) e de sen(x) sobrepostos:
curve(f, from = -11,
to = 11,
col = "red",
lwd = 2,
panel.first = grid (20, 20 , lty = 1, lwd = 1),
xlim = c(-10,10),
ylim = c(-4,4),
main = bquote("Gráfico da Função"),
xlab = "Valores de x",
ylab = "Valores de y")
curve(f2, from = -11,
to = 11,
col = "darkgreen",
lwd = 2,
add = TRUE)
legend("topleft",c("-sen(x)", "sen(x)"),fill=c("red", "darkgreen"))
abline(h=0, v=0, col = "blue")
mtext("Produzido por Renan Miranda", 4, 0.7)
#--------PONTO (0,0) NO PLANO CARTESIANO--------#
x <- c(0)
y <- c(0)
points(x, y, pch = 20, col ="black")
text (x + 0.3, y - 0.5, paste( x ), col = "blue")

# Como -sen(x) e sen(x) têm os mesmos valores porém com o sinal inverso, o grafico de uma função para outra também se inverte.
Funções Trigonométricas (seno) #8
f <- function(x){ sin(-2*x)
}
curve(f, from = -11,
to = 11,
col = "red",
lwd = 2,
panel.first = grid (20, 20 , lty = 1, lwd = 1),
xlim = c(-10,10),
ylim = c(-4,4),
main = bquote("Gráfico da Função"),
xlab = "Valores de x",
ylab = "Valores de y")
legend("topleft",c("sin(-2x)"),fill=c("red"))
abline(h=0, v=0, col = "blue")
mtext("Produzido por Renan Miranda", 4, 0.7)
#--------PONTO (0,0) NO PLANO CARTESIANO--------#
x <- c(0)
y <- c(0)
points(x, y, pch = 20, col ="black")
text (x - 0.5, y - 0.5, paste( x ), col = "blue")
#-----"RETA NA COR VERDE ESCURO"---------#
#-----------HORIZONTAL---------------#
i <- c(11.0, -11.0)
j <- c(1.0, 1.0)
lines(i, j, lty = 3, lwd = 2, col = "purple")
#-----------HORIZONTAL---------------#
i <- c(11.0, -11.0)
j <- c(-1.0, -1.0)
lines(i, j, lty = 3, lwd = 2, col = "purple")

# A exemplo de -sen(x) e sen(x), o gráfico de sen(-2x) e sen(2x) também parecem iguais. Contudo, seguindo o mesmo raciocínio do item anterior, temos que os gráficos são invertidos.
f <- function(x){ sin(-2*x)
}
curve(f, from = -11,
to = 11,
col = "red",
lwd = 2,
panel.first = grid (20, 20 , lty = 1, lwd = 1),
xlim = c(-10,10),
ylim = c(-4,4),
main = bquote("Gráfico da Função"),
xlab = "Valores de x",
ylab = "Valores de y")
legend("topleft",c("sen(-2x)","sen(2x)"),fill=c("red", "darkgreen"))
abline(h=0, v=0, col = "blue")
mtext("Produzido por Renan Miranda", 4, 0.7)
f2 <- function(x){ sin(2*x)
}
curve(f2, from = -11,
to = 11,
col = "darkgreen",
lwd = 2,
add = TRUE)
#--------PONTO (0,0) NO PLANO CARTESIANO--------#
x <- c(0)
y <- c(0)
points(x, y, pch = 20, col ="black")
text (x - 0.5, y - 0.5, paste( x ), col = "blue")

Funções Trigonométricas (seno) #9
f <- function(x){ sin(-1/2*x)
}
curve(f, from = -11,
to = 11,
col = "red",
lwd = 2,
panel.first = grid (20, 20 , lty = 1, lwd = 1),
xlim = c(-10,10),
ylim = c(-4,4),
main = bquote("Gráfico da Função"),
xlab = "Valores de x",
ylab = "Valores de y")
legend("topright",legend =expression(sen[(-1/2)*x], sen(1/2*x)),
col=c("red", "darkgreen"), lty = 1, lwd = 2)
abline(h=0, v=0, col = "blue")
mtext("Produzido por Renan Miranda", 4, 0.7)
#--------PONTO (0,0) NO PLANO CARTESIANO--------#
x <- c(0)
y <- c(0)
points(x, y, pch = 20, col ="black")
text (x + 0.5, y - 0.5, paste( x ), col = "blue")
#-----"RETA NA COR VERDE ESCURO"---------#
#-----------HORIZONTAL---------------#
i <- c(11.0, -11.0)
j <- c(1.0, 1.0)
lines(i, j, lty = 3, lwd = 2, col = "purple")
#-----------HORIZONTAL---------------#
i <- c(11.0, -11.0)
j <- c(-1.0, -1.0)
lines(i, j, lty = 3, lwd = 2, col = "purple")
f2 <- function(x){ sin(1/2*x)
}
curve(f2, from = -11,
to = 11,
col = "darkgreen",
lwd = 2,
add = TRUE)

# Pelos motivos já citados, o grafico de sen(-1/2x) e o de sen(1/2x) também se invertem
Funções Trigonométricas (seno) #10
f <- function(x){ -1/2*sin(x)
}
curve(f, from = -11,
to = 11,
col = "red",
lwd = 2,
panel.first = grid (20, 20 , lty = 1, lwd = 1),
xlim = c(-10,10),
ylim = c(-2,2),
main = bquote("Gráfico da Função"),
xlab = "Valores de x",
ylab = "Valores de y")
legend("topleft",c("-(1/2sen(x))", "1/2sen(x)"),fill=c("red", "darkgreen"))
abline(h=0, v=0, col = "blue")
mtext("Produzido por Renan Miranda", 4, 0.7)
#--------PONTO (0,0) NO PLANO CARTESIANO--------#
x <- c(0)
y <- c(0)
points(x, y, pch = 20, col ="black")
text (x + 0.2, y - 0.2, paste( x ), col = "blue")
#-----"RETA NA COR VERDE ESCURO"---------#
#-----------HORIZONTAL---------------#
i <- c(11.0, -11.0)
j <- c(0.5, 0.5)
lines(i, j, lty = 3, lwd = 2, col = "purple")
#-----------HORIZONTAL---------------#
i <- c(11.0, -11.0)
j <- c(-0.5, -0.5)
lines(i, j, lty = 3, lwd = 2, col = "purple")
f <- function(x){ 1/2*sin(x)
}
curve(f, from = -11,
to = 11,
col = "darkgreen",
lwd = 2,
add = TRUE)

# Como já citado anteriormente, o gráfico de -(1/2sen(x)) e 1/2sen(x) também se invertem.
Funções Trigonométricas (cosseno) #1
f <- function(x){cos(x)
}
curve(f, from = -11,
to = 11,
col = "red",
lwd = 2,
panel.first = grid (20, 20 , lty = 1, lwd = 1),
xlim = c(-10,10),
ylim = c(-4,4),
main = bquote("Gráfico da Função"),
xlab = "Valores de x",
ylab = "Valores de y")
legend("topleft",c("cos(x)"),fill=c("red"))
abline(h=0, v=0, col = "blue")
mtext("Produzido por Renan Miranda", 4, 0.7)
#--------PONTO (0,0) NO PLANO CARTESIANO--------#
x <- c(0)
y <- c(0)
points(x, y, pch = 20, col ="black")
text (x + 0.5, y - 0.2, paste( x ), col = "blue")
#-----"RETA NA COR VERDE ESCURO"---------#
#-----------HORIZONTAL---------------#
i <- c(11.0, -11.0)
j <- c(-1.0, -1.0)
lines(i, j, lty = 3, lwd = 2, col = "purple")
#-----------HORIZONTAL---------------#
i <- c(11.0, -11.0)
j <- c(1.0, 1.0)
lines(i, j, lty = 3, lwd = 2, col = "purple")

# Repare que o gráfico de cos(x) e sen(x) têm os mesmos formatos, as mesmas ondas, porém, há um deslocamento de um para o outro. Além do mais, ambos variam seus resultados de -1 a 1. Veja uma comparação entre eles:
f <- function(x){cos(x)
}
curve(f, from = -11,
to = 11,
col = "red",
lwd = 2,
panel.first = grid (20, 20 , lty = 1, lwd = 1),
xlim = c(-10,10),
ylim = c(-4,4),
main = bquote("Gráfico da Função"),
xlab = "Valores de x",
ylab = "Valores de y")
legend("topleft",c("cos(x)", "sin(x)"),fill=c("red", "darkgreen"))
abline(h=0, v=0, col = "blue")
mtext("Produzido por Renan Miranda", 4, 0.7)
#--------PONTO (0,0) NO PLANO CARTESIANO--------#
x <- c(0)
y <- c(0)
points(x, y, pch = 20, col ="black")
text (x + 0.5, y - 0.2, paste( x ), col = "blue")
f2 <- function(x){sin(x)
}
curve(f2, from = -11,
to = 11,
col = "darkgreen",
lwd = 2,
add = TRUE)

Funções Trigonométricas (cosseno) #2
f <- function(x){cos(2*x)
}
curve(f, from = -11,
to = 11,
col = "red",
lwd = 2,
panel.first = grid (20, 20 , lty = 1, lwd = 1),
xlim = c(-10,10),
ylim = c(-4,4),
main = bquote("Gráfico da Função"),
xlab = "Valores de x",
ylab = "Valores de y")
legend("topleft",c("cos(2x)"),fill=c("red"))
abline(h=0, v=0, col = "blue")
mtext("Produzido por Renan Miranda", 4, 0.7)
#--------PONTO (0,0) NO PLANO CARTESIANO--------#
x <- c(0)
y <- c(0)
points(x, y, pch = 20, col ="black")
text (x + 0.5, y - 0.2, paste( x ), col = "blue")
#-----"RETA NA COR VERDE ESCURO"---------#
#-----------HORIZONTAL---------------#
i <- c(11.0, -11.0)
j <- c(-1.0, -1.0)
lines(i, j, lty = 3, lwd = 2, col = "purple")
#-----------HORIZONTAL---------------#
i <- c(11.0, -11.0)
j <- c(1.0, 1.0)
lines(i, j, lty = 3, lwd = 2, col = "purple")

# A exemplo do gráfico de sen(2x), o de cos(2x) também continua variando de -1 a 1 e as ondas também ficam mais contraídas. Porém diferentemente das funções seno, o cos(2x) e o cos(-2x) têm o mesmo gráfico. Veja:
f <- function(x){cos(2*x)
}
curve(f, from = -11,
to = 11,
col = "red",
lwd = 2,
panel.first = grid (20, 20 , lty = 1, lwd = 1),
xlim = c(-10,10),
ylim = c(-4,4),
main = bquote("Gráfico da Função"),
xlab = "Valores de x",
ylab = "Valores de y")
legend("topleft",c("cos(2x)", "cos(-2x)"),fill=c("red", "red"))
abline(h=0, v=0, col = "blue")
mtext("Produzido por Renan Miranda", 4, 0.7)
#--------PONTO (0,0) NO PLANO CARTESIANO--------#
x <- c(0)
y <- c(0)
points(x, y, pch = 20, col ="black")
text (x + 0.5, y - 0.2, paste( x ), col = "blue")
f2 <- function(x){cos(-2*x)
}
curve(f2, from = -11,
to = 11,
col = "red",
lwd = 2,
add = TRUE)
#-----"RETA NA COR VERDE ESCURO"---------#
#-----------HORIZONTAL---------------#
i <- c(11.0, -11.0)
j <- c(-1.0, -1.0)
lines(i, j, lty = 3, lwd = 2, col = "purple")
#-----------HORIZONTAL---------------#
i <- c(11.0, -11.0)
j <- c(1.0, 1.0)
lines(i, j, lty = 3, lwd = 2, col = "purple")

Funções Trigonométricas (cosseno) #3
f <- function(x){cos(1/2*x)
}
curve(f, from = -11,
to = 11,
col = "red",
lwd = 2,
panel.first = grid (20, 20 , lty = 1, lwd = 1),
xlim = c(-10,10),
ylim = c(-4,4),
main = bquote("Gráfico da Função"),
xlab = "Valores de x",
ylab = "Valores de y")
legend("topleft",c("cos(1/2x)"),fill=c("red"))
abline(h=0, v=0, col = "blue")
mtext("Produzido por Renan Miranda", 4, 0.7)
#--------PONTO (0,0) NO PLANO CARTESIANO--------#
x <- c(0)
y <- c(0)
points(x, y, pch = 20, col ="black")
text (x + 0.5, y - 0.2, paste( x ), col = "blue")
#-----"RETA NA COR VERDE ESCURO"---------#
#-----------HORIZONTAL---------------#
i <- c(11.0, -11.0)
j <- c(-1.0, -1.0)
lines(i, j, lty = 3, lwd = 2, col = "purple")
#-----------HORIZONTAL---------------#
i <- c(11.0, -11.0)
j <- c(1.0, 1.0)
lines(i, j, lty = 3, lwd = 2, col = "purple")

# Seguindo o mesmo pensamento anterior, o gráfico de cos(1/2x) e cos(-1/2x) também ficam iguais. Veja:
f <- function(x){cos(1/2*x)
}
curve(f, from = -11,
to = 11,
col = "red",
lwd = 2,
panel.first = grid (20, 20 , lty = 1, lwd = 1),
xlim = c(-10,10),
ylim = c(-4,4),
main = bquote("Gráfico da Função"),
xlab = "Valores de x",
ylab = "Valores de y")
legend("topleft",c("cos(1/2x)", "cos(-1/2x)"),fill=c("red", "red"))
abline(h=0, v=0, col = "blue")
mtext("Produzido por Renan Miranda", 4, 0.7)
#--------PONTO (0,0) NO PLANO CARTESIANO--------#
x <- c(0)
y <- c(0)
points(x, y, pch = 20, col ="black")
text (x + 0.5, y - 0.2, paste( x ), col = "blue")
f2 <- function(x){cos(-1/2*x)
}
curve(f2, from = -11,
to = 11,
col = "red",
lwd = 2,
add = TRUE)
#-----"RETA NA COR VERDE ESCURO"---------#
#-----------HORIZONTAL---------------#
i <- c(11.0, -11.0)
j <- c(-1.0, -1.0)
lines(i, j, lty = 3, lwd = 2, col = "purple")
#-----------HORIZONTAL---------------#
i <- c(11.0, -11.0)
j <- c(1.0, 1.0)
lines(i, j, lty = 3, lwd = 2, col = "purple")

Funções Trigonométricas (cosseno) #4
f <- function(x){2*cos(x)
}
curve(f, from = -11,
to = 11,
col = "red",
lwd = 2,
panel.first = grid (20, 20 , lty = 1, lwd = 1),
xlim = c(-10,10),
ylim = c(-4,4),
main = bquote("Gráfico da Função"),
xlab = "Valores de x",
ylab = "Valores de y")
legend("topleft",c("2(cos(x))"),fill=c("red"))
abline(h=0, v=0, col = "blue")
mtext("Produzido por Renan Miranda", 4, 0.7)
#--------PONTO (0,0) NO PLANO CARTESIANO--------#
x <- c(0)
y <- c(0)
points(x, y, pch = 20, col ="black")
text (x + 0.5, y - 0.2, paste( x ), col = "blue")
#-----"RETA NA COR VERDE ESCURO"---------#
#-----------HORIZONTAL---------------#
i <- c(11.0, -11.0)
j <- c(-2.0, -2.0)
lines(i, j, lty = 3, lwd = 2, col = "purple")
#-----------HORIZONTAL---------------#
i <- c(11.0, -11.0)
j <- c(2.0, 2.0)
lines(i, j, lty = 3, lwd = 2, col = "purple")

# Agora, primeiro calculamos o cosseno e em seguida multiplicamos por 2. Portanto, haverá uma diferença se multiplicarmos o cos(x) por 2 ou por -2. Veja:
f <- function(x){2*cos(x)
}
curve(f, from = -11,
to = 11,
col = "red",
lwd = 2,
panel.first = grid (20, 20 , lty = 1, lwd = 1),
xlim = c(-10,10),
ylim = c(-4,4),
main = bquote("Gráfico da Função"),
xlab = "Valores de x",
ylab = "Valores de y")
legend("topleft",c("2(cos(x))", "-2(cos(x))"),fill=c("red", "darkgreen"))
abline(h=0, v=0, col = "blue")
mtext("Produzido por Renan Miranda", 4, 0.7)
#--------PONTO (0,0) NO PLANO CARTESIANO--------#
x <- c(0)
y <- c(0)
points(x, y, pch = 20, col ="black")
text (x + 0.5, y - 0.2, paste( x ), col = "blue")
f <- function(x){-2*cos(x)
}
curve(f, from = -11,
to = 11,
col = "darkgreen",
lwd = 2,
add = TRUE)
#-----"RETA NA COR VERDE ESCURO"---------#
#-----------HORIZONTAL---------------#
i <- c(11.0, -11.0)
j <- c(-2.0, -2.0)
lines(i, j, lty = 3, lwd = 2, col = "purple")
#-----------HORIZONTAL---------------#
i <- c(11.0, -11.0)
j <- c(2.0, 2.0)
lines(i, j, lty = 3, lwd = 2, col = "purple")

Funções Trigonométricas (tangente) #1
f <- function(x){tan(x)
}
curve(f, from = -1.5,
to =1.5,
col = "red",
lwd = 2,
panel.first = grid (20, 20 , lty = 1, lwd = 1),
xlim = c(-5,5),
ylim = c(-10,10),
main = bquote("Gráfico da Função"),
xlab = "Valores de x",
ylab = "Valores de y")
abline(h=0, v=0, col = "blue")
mtext("Produzido por Renan Miranda", 4, 0.7)
#--------PONTO (0,0) NO PLANO CARTESIANO--------#
x <- c(0)
y <- c(0)
points(x, y, pch = 20, col ="black")
text (x - 0.2, y - 3, paste( x ), col = "blue")

Funções Trigonométricas (arcseno) #1
f <- function(x){asin(x)
}
curve(f, from = -1,
to = 1,
col = "red",
lwd = 2,
panel.first = grid (20, 20 , lty = 1, lwd = 1),
xlim = c(-3,3),
ylim = c(-4,4),
main = bquote("Gráfico da Função"),
xlab = "Valores de x",
ylab = "Valores de y")
legend("topleft",c("arcsen(x)"),fill=c("red"))
abline(h=0, v=0, col = "blue")
mtext("Produzido por Renan Miranda", 4, 0.7)
#--------PONTO (0,0) NO PLANO CARTESIANO--------#
x <- c(0)
y <- c(0)
points(x, y, pch = 20, col ="black")
text (x + 0.2, y - 0.4, paste( x ), col = "blue")

# Na Função arcsen, os valores de x não são mais ângulos e sim números. Como vimos anteriormente, os resultados de sen(x) estão definidos entre -1 e 1. Logo, os valores de x que substituiremos na função arcsen(x) estão entre -1 e 1. Suponhamos a função arcsen(1). Podemos pensar da seguinte maneira: o seno de qual ângulo tem como resultado 1? Como sen(90)=1, temos que arcsen(1)=90 graus
Funções Trigonométricas (arcseno) #2
f <- function(x){2*asin(x)
}
curve(f, from = -1,
to = 1,
col = "red",
lwd = 2,
panel.first = grid (20, 20 , lty = 1, lwd = 1),
xlim = c(-3,3),
ylim = c(-4,4),
main = bquote("Gráfico da Função"),
xlab = "Valores de x",
ylab = "Valores de y")
legend("topleft",c("2arcsen(x)"),fill=c("red"))
abline(h=0, v=0, col = "blue")
mtext("Produzido por Renan Miranda", 4, 0.7)
#--------PONTO (0,0) NO PLANO CARTESIANO--------#
x <- c(0)
y <- c(0)
points(x, y, pch = 20, col ="black")
text (x + 0.2, y - 0.4, paste( x ), col = "blue")

# Vamos pensar no exemplo anterior onde arcsen(1)=90 graus. Temos agora 2arcsen(x), logo, como já vimos, vamos obter o resultado de arcsen(x) depois multiplicar por 2. Com isso, 2arcsen(1)=180 graus. Vemos então o gráfico se esticar na vertical, visto que os valores estão dobrados.
Funções Trigonométricas (arcseno) #3
f <- function(x){1/2*asin(x)
}
curve(f, from = -1,
to = 1,
col = "red",
lwd = 2,
panel.first = grid (20, 20 , lty = 1, lwd = 1),
xlim = c(-3,3),
ylim = c(-4,4),
main = bquote("Gráfico da Função"),
xlab = "Valores de x",
ylab = "Valores de y")
legend("topleft",c("1/2arcsen(x)"),fill=c("red"))
abline(h=0, v=0, col = "blue")
mtext("Produzido por Renan Miranda", 4, 0.7)
#--------PONTO (0,0) NO PLANO CARTESIANO--------#
x <- c(0)
y <- c(0)
points(x, y, pch = 20, col ="black")
text (x + 0.2, y - 0.4, paste( x ), col = "blue")

# Se quando multiplicamos a função por um número maior que 1 o gráfico estica na vertical, quando multiplicamos por um número entre 0 e 1 o gráfico se encolhe na vertical. O motivo é o seguinte, como arcsen(1)=90 graus, 1/2arcsen(1)=30, logo, os valores crescem mais devagar
Funções Trigonométricas (arcseno) #4
f <- function(x){-asin(x)
}
curve(f, from = -1,
to = 1,
col = "red",
lwd = 2,
panel.first = grid (20, 20 , lty = 1, lwd = 1),
xlim = c(-3,3),
ylim = c(-4,4),
main = bquote("Gráfico da Função"),
xlab = "Valores de x",
ylab = "Valores de y")
legend("topleft",c("-arcsen(x)"),fill=c("red"))
abline(h=0, v=0, col = "blue")
mtext("Produzido por Renan Miranda", 4, 0.7)
#--------PONTO (0,0) NO PLANO CARTESIANO--------#
x <- c(0)
y <- c(0)
points(x, y, pch = 20, col ="black")
text (x - 0.2, y - 0.4, paste( x ), col = "blue")

# Como era de se esperar pois já vimos antes, quando a função é negativa, o gráfico inverte o lado. O mesmo acontecerá para -2arcsen(x), -1/2arcsen(x)
Funções Trigonométricas (arccos) #1
f <- function(x){acos(x)
}
curve(f, from = -1,
to = 1,
col = "red",
lwd = 2,
panel.first = grid (20, 20 , lty = 1, lwd = 1),
xlim = c(-2,2),
ylim = c(-4,4),
main = bquote("Gráfico da Função"),
xlab = "Valores de x",
ylab = "Valores de y")
legend("topleft",c("arccos(x)"),fill=c("red"))
abline(h=0, v=0, col = "blue")
mtext("Produzido por Renan Miranda", 4, 0.7)
#--------PONTO (0,0) NO PLANO CARTESIANO--------#
x <- c(0)
y <- c(0)
points(x, y, pch = 20, col ="black")
text (x + 0.1, y - 0.4, paste( x ), col = "blue")

# Assim como na função arcsen(x), a função arccose(x) também só admite valores de x entre -1 e 1 e o processo de resolução coninua o mesmo. Suponhamos em arcsen(0). Agora pensemos: o cosseno de qual ãngulo é 0? Como cos(90)=0, logo arccos(0)=90 graus.
Funções Trigonométricas (arccos) #2
f <- function(x){2*acos(x)
}
curve(f, from = -1,
to = 1,
col = "red",
lwd = 2,
panel.first = grid (20, 20 , lty = 1, lwd = 1),
xlim = c(-2,2),
ylim = c(-4,4),
main = bquote("Gráfico da Função"),
xlab = "Valores de x",
ylab = "Valores de y")
legend("topleft",c("2arccos(x)"),fill=c("red"))
abline(h=0, v=0, col = "blue")
mtext("Produzido por Renan Miranda", 4, 0.7)
#--------PONTO (0,0) NO PLANO CARTESIANO--------#
x <- c(0)
y <- c(0)
points(x, y, pch = 20, col ="black")
text (x + 0.1, y - 0.4, paste( x ), col = "blue")

# Similarmente ao que vimos em 2arcsen(x), o gráfico de 2arccos(x) também se estica na vertical, visto que todos os resultados serão multiplicados por 2. E ele se esticará mais ainda na medida em que aumentarmos este multiplicador.
Funções Trigonométricas (arccos) #3
f <- function(x){1/2*acos(x)
}
curve(f, from = -1,
to = 1,
col = "red",
lwd = 2,
panel.first = grid (20, 20 , lty = 1, lwd = 1),
xlim = c(-2,2),
ylim = c(-4,4),
main = bquote("Gráfico da Função"),
xlab = "Valores de x",
ylab = "Valores de y")
legend("topleft",c("1/2arccos(x)"),fill=c("red"))
abline(h=0, v=0, col = "blue")
mtext("Produzido por Renan Miranda", 4, 0.7)
#--------PONTO (0,0) NO PLANO CARTESIANO--------#
x <- c(0)
y <- c(0)
points(x, y, pch = 20, col ="black")
text (x + 0.1, y - 0.4, paste( x ), col = "blue")

#
Funções Trigonométricas (arccos) #4
f <- function(x){-acos(x)
}
curve(f, from = -1,
to = 1,
col = "red",
lwd = 2,
panel.first = grid (20, 20 , lty = 1, lwd = 1),
xlim = c(-2,2),
ylim = c(-4,4),
main = bquote("Gráfico da Função"),
xlab = "Valores de x",
ylab = "Valores de y")
legend("topleft",c("-arccos(x)"),fill=c("red"))
abline(h=0, v=0, col = "blue")
mtext("Produzido por Renan Miranda", 4, 0.7)
#--------PONTO (0,0) NO PLANO CARTESIANO--------#
x <- c(0)
y <- c(0)
points(x, y, pch = 20, col ="black")
text (x + 0.1, y - 0.4, paste( x ), col = "blue")

#
Funções Trigonométricas (arctan) #1
f <- function(x){atan(x)
}
curve(f, from = -4,
to = 4,
col = "red",
lwd = 2,
panel.first = grid (20, 20 , lty = 1, lwd = 1),
xlim = c(-2,2),
ylim = c(-4,4),
main = bquote("Gráfico da Função"),
xlab = "Valores de x",
ylab = "Valores de y")
legend("topleft",c("arctan(x)"),fill=c("red"))
abline(h=0, v=0, col = "blue")
mtext("Produzido por Renan Miranda", 4, 0.7)
#--------PONTO (0,0) NO PLANO CARTESIANO--------#
x <- c(0)
y <- c(0)
points(x, y, pch = 20, col ="black")
text (x + 0.1, y - 0.4, paste( x ), col = "blue")

#
Funções Trigonométricas (arctan) #2
f <- function(x){2*atan(x)
}
curve(f, from = -4,
to = 4,
col = "red",
lwd = 2,
panel.first = grid (20, 20 , lty = 1, lwd = 1),
xlim = c(-2,2),
ylim = c(-4,4),
main = bquote("Gráfico da Função"),
xlab = "Valores de x",
ylab = "Valores de y")
legend("topleft",c("2arctan(x)"),fill=c("red"))
abline(h=0, v=0, col = "blue")
mtext("Produzido por Renan Miranda", 4, 0.7)
#--------PONTO (0,0) NO PLANO CARTESIANO--------#
x <- c(0)
y <- c(0)
points(x, y, pch = 20, col ="black")
text (x + 0.1, y - 0.4, paste( x ), col = "blue")

#
Funções Trigonométricas (arctan) #3
f <- function(x){1/2*atan(x)
}
curve(f, from = -4,
to = 4,
col = "red",
lwd = 2,
panel.first = grid (20, 20 , lty = 1, lwd = 1),
xlim = c(-2,2),
ylim = c(-4,4),
main = bquote("Gráfico da Função"),
xlab = "Valores de x",
ylab = "Valores de y")
legend("topleft",c("1/2arctan(x)"),fill=c("red"))
abline(h=0, v=0, col = "blue")
mtext("Produzido por Renan Miranda", 4, 0.7)
#--------PONTO (0,0) NO PLANO CARTESIANO--------#
x <- c(0)
y <- c(0)
points(x, y, pch = 20, col ="black")
text (x + 0.1, y - 0.4, paste( x ), col = "blue")

#
Funções Trigonométricas (arctan) #4
f <- function(x){-atan(x)
}
curve(f, from = -4,
to = 4,
col = "red",
lwd = 2,
panel.first = grid (20, 20 , lty = 1, lwd = 1),
xlim = c(-2,2),
ylim = c(-4,4),
main = bquote("Gráfico da Função"),
xlab = "Valores de x",
ylab = "Valores de y")
legend("topleft",c("-arctan(x)"),fill=c("red"))
abline(h=0, v=0, col = "blue")
mtext("Produzido por Renan Miranda", 4, 0.7)
#--------PONTO (0,0) NO PLANO CARTESIANO--------#
x <- c(0)
y <- c(0)
points(x, y, pch = 20, col ="black")
text (x + 0.1, y - 0.4, paste( x ), col = "blue")

#
Funções Logarítmicas #1
f <- function(x){log(x, base = 10)
}
curve(f, from = 0,
to = 10,
col = "red",
lwd = 2,
panel.first = grid (20, 20 , lty = 1, lwd = 1),
xlim = c(-2,8),
ylim = c(-0.7,1),
main = bquote("Gráfico da Função"),
xlab = "Valores de x",
ylab = "Valores de y")
legend("bottomright",legend =expression(log(x, base = 10)),fill=c("red"))
abline(h=0, v=0, col = "blue", lwd=2)
mtext("Produzido por Renan Miranda", 4, 0.7)
#--------PONTO (0,0) NO PLANO CARTESIANO--------#
x <- c(0)
y <- c(0)
points(x, y, pch = 20, col ="black")
text (x + 0.3, y - 0.1, paste( x ), col = "blue")

#
Funções Logarítmicas #2
f <- function(x){log(x, base = 5)
}
curve(f, from = 0,
to = 10,
col = "red",
lwd = 2,
panel.first = grid (20, 20 , lty = 1, lwd = 1),
xlim = c(-2,8),
ylim = c(-0.7,1),
main = bquote("Gráfico da Função"),
xlab = "Valores de x",
ylab = "Valores de y")
legend("topright",legend =expression(log[x]*(5)),
col=c("red"), lty = 1, lwd = 2)
abline(h=0, v=0, col = "blue", lwd=2)
mtext("Produzido por Renan Miranda", 4, 0.7)
#--------PONTO (0,0) NO PLANO CARTESIANO--------#
x <- c(0)
y <- c(0)
points(x, y, pch = 20, col ="black")
text (x + 0.3, y - 0.1, paste( x ), col = "blue")

#