approxfun
位於 stats
包(package)。 說明
返回對給定數據點進行線性插值的點列表,或執行線性(或常量)插值的函數。
用法
approx (x, y = NULL, xout, method = "linear", n = 50,
yleft, yright, rule = 1, f = 0, ties = mean, na.rm = TRUE)
approxfun(x, y = NULL, method = "linear",
yleft, yright, rule = 1, f = 0, ties = mean, na.rm = TRUE)
參數
x, y |
給出要插值點的坐標的數值向量。或者,可以指定單個繪圖結構:請參閱 |
xout |
一組可選的數值,指定插值發生的位置。 |
method |
指定要使用的插值方法。選項為 |
n |
如果未指定 |
yleft |
當輸入 |
yright |
當輸入 |
rule |
一個整數(長度為 1 或 2),說明如何在區間 [ |
f |
對於 |
ties |
處理綁定的 |
na.rm |
邏輯指定應如何處理缺失值( |
細節
輸入可以包含被刪除的缺失值(如果 na.rm
為 true,即默認情況下),因此至少需要兩個完整的 (x, y)
對(對於 method =
"linear"
,否則一對)。如果存在重複(捆綁)的 x
值,並且 ties
包含一個函數,則該函數將應用於每個不同的 x
值的 y
值,以生成具有唯一 x
的 (x,y)
對。此上下文中有用的函數包括 mean
、 min
和 max
。
如果 ties = "ordered"
則假定 x
值已經排序(並且是唯一的),並且不檢查關係,但如果存在關係則保留。這是大型 length(x)
最快的選項。
如果 ties
是長度為 2 的 list
,則 ties[[2]]
必須是應用於關係的函數,請參見上文,但如果 ties[[1]]
與 "ordered"
相同,則假定 x
值是已排序並且僅檢查平局。因此,在這種情況下,ties = list("ordered", mean)
將比默認的 ties = mean
稍微高效一些。
第一個 y
值將用於向左插值,最後一個值將用於向右插值。
值
approx
返回一個包含組件 x
和 y
的列表,其中包含 n
坐標,該坐標根據所需的 method
(和 rule
)插入給定的數據點。
函數 approxfun
返回一個對給定數據點執行(線性或常數)插值的函數。對於給定的一組x
值,此函數將返回相應的插值。它使用創建時存儲在其環境中的數據,其詳細信息可能會發生變化。
警告
返回的值approxfun
包含對當前版本中代碼的引用R:它不打算保存並加載到不同的R會議。這對於更安全R>= 3.0.0。
例子
require(graphics)
x <- 1:10
y <- rnorm(10)
par(mfrow = c(2,1))
plot(x, y, main = "approx(.) and approxfun(.)")
points(approx(x, y), col = 2, pch = "*")
points(approx(x, y, method = "constant"), col = 4, pch = "*")
f <- approxfun(x, y)
curve(f(x), 0, 11, col = "green2")
points(x, y)
is.function(fc <- approxfun(x, y, method = "const")) # TRUE
curve(fc(x), 0, 10, col = "darkblue", add = TRUE)
## different extrapolation on left and right side :
plot(approxfun(x, y, rule = 2:1), 0, 11,
col = "tomato", add = TRUE, lty = 3, lwd = 2)
### Treatment of 'NA's -- are kept if na.rm=FALSE :
xn <- 1:4
yn <- c(1,NA,3:4)
xout <- (1:9)/2
## Default behavior (na.rm = TRUE): NA's omitted; extrapolation gives NA
data.frame(approx(xn,yn, xout))
data.frame(approx(xn,yn, xout, rule = 2))# -> *constant* extrapolation
## New (2019-2020) na.rm = FALSE: NA's are "kept"
data.frame(approx(xn,yn, xout, na.rm=FALSE, rule = 2))
data.frame(approx(xn,yn, xout, na.rm=FALSE, rule = 2, method="constant"))
## NA's in x[] are not allowed:
stopifnot(inherits( try( approx(yn,yn, na.rm=FALSE) ), "try-error"))
## Give a nice overview of all possibilities rule * method * na.rm :
## ----------------------------- ==== ====== =====
## extrapolations "N":= NA; "C":= Constant :
rules <- list(N=1, C=2, NC=1:2, CN=2:1)
methods <- c("constant","linear")
ry <- sapply(rules, function(R) {
sapply(methods, function(M)
sapply(setNames(,c(TRUE,FALSE)), function(na.)
approx(xn, yn, xout=xout, method=M, rule=R, na.rm=na.)$y),
simplify="array")
}, simplify="array")
names(dimnames(ry)) <- c("x = ", "na.rm", "method", "rule")
dimnames(ry)[[1]] <- format(xout)
ftable(aperm(ry, 4:1)) # --> (4 * 2 * 2) x length(xout) = 16 x 9 matrix
## Show treatment of 'ties' :
x <- c(2,2:4,4,4,5,5,7,7,7)
y <- c(1:6, 5:4, 3:1)
(amy <- approx(x, y, xout = x)$y) # warning, can be avoided by specifying 'ties=':
op <- options(warn=2) # warnings would be error
stopifnot(identical(amy, approx(x, y, xout = x, ties=mean)$y))
(ay <- approx(x, y, xout = x, ties = "ordered")$y)
stopifnot(amy == c(1.5,1.5, 3, 5,5,5, 4.5,4.5, 2,2,2),
ay == c(2, 2, 3, 6,6,6, 4, 4, 1,1,1))
approx(x, y, xout = x, ties = min)$y
approx(x, y, xout = x, ties = max)$y
options(op) # revert 'warn'ing level
參考
Becker, R. A., Chambers, J. M. and Wilks, A. R. (1988) The New S Language. Wadsworth & Brooks/Cole.
也可以看看
相關用法
- R aggregate 計算數據子集的匯總統計
- R alias 查找模型中的別名(依賴項)
- R anova.glm 廣義線性模型擬合的偏差分析
- R anova.mlm 多元線性模型之間的比較
- R addmargins 在多維表或數組上設置任意邊距
- R anova 方差分析表
- R asOneSidedFormula 轉換為單邊公式
- R as.hclust 將對象轉換為 hclust 類
- R ar.ols 通過 OLS 將自回歸模型擬合到時間序列
- R arima.sim 從 ARIMA 模型進行模擬
- R ar 將自回歸模型擬合到時間序列
- R arima 時間序列的 ARIMA 建模
- R ansari.test 安薩裏-布拉德利檢驗
- R add1 在模型中添加或刪除所有可能的單項
- R acf 自協方差和互協方差以及相關函數估計
- R aov 擬合方差分析模型
- R ave 因子水平組合的組平均值
- R arima0 時間序列的 ARIMA 建模 – 初步版本
- R acf2AR 計算精確擬合 ACF 的 AR 過程
- R anova.lm 線性模型擬合的方差分析
- R stlmethods STL 對象的方法
- R medpolish 矩陣的中值波蘭(穩健雙向分解)
- R naprint 調整缺失值
- R summary.nls 總結非線性最小二乘模型擬合
- R summary.manova 多元方差分析的匯總方法
注:本文由純淨天空篩選整理自R-devel大神的英文原創作品 Interpolation Functions。非經特殊聲明,原始代碼版權歸原作者所有,本譯文未經允許或授權,請勿轉載或複製。