I have tried to create a “Butterfly Plot” using plot() function in r. The equestions are from this formula. \[x(t)= sin(t)(e^{cos(t)}-2cos(4t)+sin^5(\frac{t}{12}))\] \[y(t)= cos(t)(e^{cos(t)}-2cos(4t)+sin^5(\frac{t}{12}))\] Here the syntax and the output
library(ggplot2)
t<-seq(0,10*pi,0.005)
x<-sin(t)*(exp(cos(t))-2*cos(4*t)+sin(t/12)^5)
y<-cos(t)*(exp(cos(t))-2*cos(4*t)+sin(t/12)^5)
plot(x,y,col="maroon",type = "l", lwd = 3,
xlab ="sin(t)(exp(cos(t))-2cos(4t)+sin(t/12)^5)",
ylab = "cos(t)(exp(cos(t))-2cos(4t)+sin(t/12)^5)",
main = "Butterfly Plot")
text(-1,1,"Butterfly", cex =0.9)
text(1,1,"Cool", cex = 0.9)
points(-1,-1, col = "blue", lwd = 10)
points(1,-1, col = "black", lwd = 10)