This is my first class in R mark down class, it is really interesting and superb. an R Markdown document. Markdown is a simple formatting syntax for authoring HTML, PDF, and MS Word documents. For more details on using R Markdown see http://rmarkdown.rstudio.com.
#Itemizing with “*” (bulletting)
Names of Every one
I <- function(S,beta,alpha,C){
C-S+(alpha/beta)*log(S)
}
beta <- 0.01
alpha <- 1/5
C <- 100
S <- seq(1,100,1)
plot(S,I(S,beta,alpha,C), xlab = "S", ylab = "I", type = "p", lwd = 2, col = "green")
#linear equation
y <- function(x){
2*x + 5
}
x <- seq(-10,10,0.1)
plot(y,x, xlab = "x", ylab = "y", col = "yellow", lwd = 2)
#Quadratic equation
y <- function(x){x^2 - 4*x + 3}
x <- seq(-10,10,1)
plot(x,y(x), xlab = "x-axis", ylab = "y-axis", col = "green", lwd = 2, main = "Quadratic function", type = "l")
#polynomial function
y <- function(x){x^3 - 3*x^2 + 2}
x <- seq(-10,10,0.1)
plot(x,y(x), xlab = "x-axis", ylab = "y-axis", col = "red", lwd = 2, main = "Polynomial function")