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
Terkait fungsi, maksimalisasi adalah proses menemukan masukan ke fungsi yang menghasilkan keluaran lebih besar daripada masukan terdekat lainnya.
Sebagai ilustrasi, plot dibawah ini menunjukkan fungsi dengan dua puncak.
h <- rfun (~ x, seed=7293)
x <- seq(-10, 10, by = 0.1)
y <- h(x)
plot(x, y, type = "l")
Sama seperti Anda dapat melihat puncak gunung dari kejauhan, Kita juga dapat melihat di mana fungsi tersebut mengambil nilai puncaknya. Gambarlah garis vertikal melalui masing-masing puncak. Nilai input yang sesuai dengan setiap garis vertikal disebut argmax , singkatan dari “argumen 2 di mana fungsi mencapai nilai maksimum lokal.
Minimisasi mengacu pada teknik yang sama, tetapi garis vertikal digambar pada titik terdalam di setiap “lembah” grafik fungsi. Nilai masukan yang terletak di salah satu lembah tersebut disebut argmin .
Optimasi adalah istilah umum yang mencakup maksimalisasi dan minimalisasi.
h <- rfun(~ x, seed=7293)
argM(h(x) ~ x, bounds(x=-5:5))
## # A tibble: 2 × 3
## x .output. concavity
## <dbl> <dbl> <dbl>
## 1 -1.68 1.93 1
## 2 0.173 8.25 -1
h <- rfun(~ x + y, seed=7293)
argM(h(x, y) ~ x + y, bounds(x=-5:5, y=-5:5))
## # A tibble: 1 × 3
## x y .output.
## <dbl> <dbl> <dbl>
## 1 3.73 -0.359 -0.186
h <- rfun(~ sin(x) + cos(y), seed=7293)
argM(h(x, y) ~ x + y, bounds(x=-5:5, y=-5:5))
## # A tibble: 1 × 3
## x y .output.
## <dbl> <dbl> <dbl>
## 1 3.73 -0.359 -0.186
Kolom memegang argmax dan argmin, kolom memberikan nilai output fungsi untuk input . Kolom ini memberi tahu apakah cekung fungsi positif atau negatif. Mendekati puncak, cekung akan negatif; Di dekat lembah, cekungan positif. Akibatnya, Anda dapat melihat bahwa baris pertama dari bingkai data sesuai dengan minimum lokal dan baris kedua adalah maksimum local.x. output.x concavity x
Referensi: Kaplan, Daniel. 2022. MOSAIC Calculus. GitHub Pages. https://dtkaplan.github.io/MC2/