Dosen Pengempu : Prof. Dr. Suhartono, M.Kom
UIN Maulana Malik Ibrahim Malang - Teknik Informatika
Temukan akar persamaan dari persamaan non-linier f(x)=x^3−2x+2 menggunakan metode terbuka dengan x0=0 dan x0=1/2 !
Temukan akar persamaan dari persamaan f(x)=sin(x)/x dengan rentang pencarian x=0,5 dan x=1 !
Hitung integral fungsi f(x)=sin2(x) pada domain x∈[0,π]
- Untuk x = 0
root_secant(function(x){(x^3)−(2*x)+2}, x=0)
## $`function`
## function(x){(x^3)-(2*x)+
## <bytecode: 0x0000000015126238>
##
## $root
## [1] -1.769292
##
## $iter
## [1] 26
Untuk x = 1/2
root_secant(function(x){(x^3)−(2*x)+2}, x=1/2)
## $`function`
## function(x){(x^3)-(2*x)+
## <bytecode: 0x0000000013772f38>
##
## $root
## [1] -1.769292
##
## $iter
## [1] 16
- Untuk x = 0.5
root_secant(function(x){sin(x)/x}, x=0.5)
## $`function`
## function(x){sin(x)/x}
## <bytecode: 0x0000000014a63670>
##
## $root
## [1] 6.283185
##
## $iter
## [1] 7
Untuk x = 1
root_secant(function(x){sin(x)/x}, x=1)
## $`function`
## function(x){sin(x)/x}
## <bytecode: 0x0000000014e27250>
##
## $root
## [1] 3.141593
##
## $iter
## [1] 8
- Mendefinisikan fungsi f(x)f(x)
trapezoid <- function(ftn, a, b, n = 100) {
h <- (b-a)/n
x.vec <- seq(a, b, by = h)
f.vec <- sapply(x.vec, ftn) # ftn(x.vec)
Trap <- h*(f.vec[1]/2 + sum(f.vec[2:n]) + f.vec[n+1]/2)
return(Trap)
}
f <- function(x){
sin(x)^2
}
Menghitung integral menggunakan trapezoid dengan permisalan n = 6
trapezoid(f,0,pi,n = 6)
## [1] 1.570796