Dosen Pembimbing : Prof.Dr.Suhartono,M.Kom
Lembaga : Universitas Islam Negri Maulana Malik Ibrahim Malang
Jurusan : Teknik Informatika
Fakultas : Sains dan Teknologi
Semoga dengan adanya latihan ini bisa menambah pengetahuan tentang turunan dan diferensiasi.
1. Latihan 1
mencari turunan dari 3 * x ^ 2 -2*x +4 ~ x, berapa nilai turunanya pada x =0 dengan menggunakan turunan D().
library(mosaicCalc)
## Loading required package: mosaic
## Registered S3 method overwritten by 'mosaic':
## method from
## fortify.SpatialPolygonsDataFrame ggplot2
##
## The 'mosaic' package masks several functions from core packages in order to add
## additional features. The original behavior of these functions should not be affected by this.
##
## Attaching package: 'mosaic'
## The following objects are masked from 'package:dplyr':
##
## count, do, tally
## The following object is masked from 'package:Matrix':
##
## mean
## The following object is masked from 'package:ggplot2':
##
## stat
## The following objects are masked from 'package:stats':
##
## binom.test, cor, cor.test, cov, fivenum, IQR, median, prop.test,
## quantile, sd, t.test, var
## The following objects are masked from 'package:base':
##
## max, mean, min, prod, range, sample, sum
## Loading required package: mosaicCore
##
## Attaching package: 'mosaicCore'
## The following objects are masked from 'package:dplyr':
##
## count, tally
##
## Attaching package: 'mosaicCalc'
## The following object is masked from 'package:stats':
##
## D
g<- D(3 * x ^ 2 -2*x +4 ~ x)
g(0)
## [1] -2
jadi, nilai dari 3 * x ^ 2 -2*x +4 ~ x dengan x=0 adalah -2.
2.Latihan 2
mencari turunan dari 5exp(0.2 x)~x a.nilai turunanya padax=0
turunan<-D( 5*exp(0.2 * x)~x)
turunan(0)
## [1] 1
jadi, nilai turunan dari 5exp(0.2 x)~x dengan x = 0 adalah 1.
b.bagaiman mereka berhubungan satu sama lain?
slice_plot(5*exp(0.2 * x)~x,domain(x=0:10))
3.Latihan 3
s2<-D(exp-(x^2) ~ x)
s2(x=-2,exp=2)
## [1] 4
slice_plot(s2(x,exp=0)~x,
domain(x=range(-2,2)))
jadi, grafik yang di dapat yakni gelombang positif diikuti oleh gelombng negatif.
4.Latihan 4
Nilai turunan dari D(fred^2 ~ ginger)
D(fred^2 ~ ginger)
## function (fred, ginger)
## 0
jadi, nilai turunan nya adalah 0 di mana-mana 5.Latihan 5
Berapa turunan ke-3 dari cos(2 * t)?
D(cos(2 * t)~t&t&t)
## function (t)
## 8 * sin(2 * t)
jadi turunan ke-3 dari cos(2 * t) adalah 8 sin(2 t)
dddf<-D(cos(2 * t)~t&t&t)
dddf(1)
## [1] 7.274379
D(sin(t)~t)
## function (t)
## cos(t)
D(sin(2*t)~t)
## function (t)
## 2 * cos(2 * t)
D(4*sin(2*t)~t)
## function (t)
## 8 * cos(2 * t)
D(8*sin(2*t)~t)
## function (t)
## 16 * cos(2 * t)
D(16*sin(2*t)~t)
## function (t)
## 32 * cos(2 * t)
2.mencari turunan ke-4?
ddddfa<-D(cos(t)~t&t&t&t)
ddddfa(1)
## [1] 0.5403023
ddddfb<-D(cos(2*t)~t&t&t&t)
ddddfb(1)
## [1] -6.658349
ddddfc<-D(4*cos(2*t)~t&t&t&t)
ddddfc(1)
## [1] -26.6334
ddddfd<-D(8*cos(2*t)~t&t&t&t)
ddddfd(1)
## [1] -53.2668
ddddfe<-D(16*cos(2*t)~t&t&t&t)
ddddfe(1)
## [1] -106.5336
Latihan 6
1.hitunglah dan buat grafik turunan ke-4 dari cos92 * t ^ 2) ~t dari t=0-5
slice_plot(cos(2 * t ^ 2) ~ t&t&t&t,domain (t=0:5))
grafik yang terbentuk adalah sebuah kosinus yang amplitudonya meningkat dan periodenya berkurang t semakin besar.
2.fungsi apa yang muncul dalam cos (2*t^2)~t turunan ke-4?
D(cos(2 * t ^ 2) ~ t&t&t&t)
## function (t)
## {
## .e1 <- t^2
## .e2 <- 2 * .e1
## .e3 <- sin(.e2)
## .e4 <- cos(.e2)
## -(4 * (4 * (2 * .e4 - 4 * (.e1 * .e3)) + 4 * .e4 - .e1 *
## (16 * .e3 + 4 * (4 * (2 * .e3 + 4 * (.e1 * .e4)) + 8 *
## .e3))))
## }
jadi, fungsi yang muncul adalah C. cos , sin, kuadrat, perkalian dan penjumlahan Latihan 7
pxy = D(x * sin(y) ~ x & y)
pyx = D(x * sin(y) ~ y & x)