我正在尝试使用R来计算β分布的特征函数,用于许多不同的alpha和beta;不幸的是,我遇到了数字问题。
首先,我使用了包CharFun
和函数cfX_Beta(t, alpha, beta)
,它似乎在大多数情况下都能正常工作,但例如对于alpha=121.3618
和beta=5041.483
,它完全失败了(请参阅下面的示例,Re(cfX_Beta(t, alpha, beta))
和Im(cfX_Beta(t, alpha, beta))
应始终位于区间[-1,1]中,而不是这种情况。)
然后我决定通过集成获得特征函数。此方法为alpha=121.3618
和beta=5041.483
提供可信的结果,但对于其他组合,集成失败。 (错误:"积分可能是不同的")。增加rel.tol
积分也没有帮助。相反,对于alpha和beta的其他值,我会得到错误:"检测到舍入错误"。
所以我的问题是: 是否有另一种方法可以获得所有可能的α和β组合的β分布特征函数的可靠结果?
我有任何明显的错误吗?
library(CharFun)
abc<-function(x,t,a,b) {
return( dbeta(x,a,b)*cos(t*x))
}
dfg<-function(x,t,a,b) {
return( dbeta(x,a,b)*sin(t*x))
}
hij<-function(t,a,b) {
intRe=rep(0,length(t))
intIm=rep(0,length(t))
i<-complex(1,0,1)
for (j in 1:length(t)) {
intRe[j]<-integrate(abc,lower=0,upper=1,t[j],a,b)$value
intIm[j]<-integrate(dfg,lower=0,upper=1,t[j],a,b)$value
}
return(intRe+intIm*i)
}
alpha<-1
beta<-1
t <- seq(-100, 100, length.out = 501)
par(mfrow=c(3,2))
alpha<-1
beta<-1
plotGraf(function(t)
hij(t, alpha, beta), t, title = "CF alpha=1
beta=1")
plotGraf(function(t)
cfX_Beta(t, alpha, beta), t, title = "CF Charfun alpha=1
beta=1")
alpha<-121.3618
beta<-5041.483
plotGraf(function(t)
hij(t, alpha, beta), t, title = "CF alpha=121.3618 beta=5041.483")
plotGraf(function(t)
cfX_Beta(t, alpha, beta), t, title = "CF Charfun alpha=121.3618 beta=5041.483")
alpha<-1
beta<-1/2
plotGraf(function(t)
hij(t, alpha, beta), t, title = "CF alpha=1
beta=1/2")
plotGraf(function(t)
cfX_Beta(t, alpha, beta), t, title = "CF Charfun alpha=1
beta=1/2")
正如您所看到的alpha=beta=1
这两种方法都会产生相同的结果,cfX_Beta(t, alpha, beta)
对于alpha=121.3618
和beta=5041.483
来说都很疯狂,整合的结果似乎是合理的。对于alpha=1
和beta=1/2
,集成失败。
答案 0 :(得分:1)
它似乎适用于RcppNumerical
,条件是使用不太小的容差(1e-4
以下)。
// [[Rcpp::depends(RcppEigen)]]
// [[Rcpp::depends(RcppNumerical)]]
#include <RcppNumerical.h>
using namespace Numer;
class BetaCDF_Re: public Func
{
private:
double a;
double b;
double t;
public:
BetaCDF_Re(double a_, double b_, double t_) : a(a_), b(b_), t(t_){}
double operator()(const double& x) const
{
return R::dbeta(x, a, b, 0) * cos(t*x);
}
};
class BetaCDF_Im: public Func
{
private:
double a;
double b;
double t;
public:
BetaCDF_Im(double a_, double b_, double t_) : a(a_), b(b_), t(t_) {}
double operator()(const double& x) const
{
return R::dbeta(x, a, b, 0) * sin(t*x);
}
};
// [[Rcpp::export]]
Rcpp::List integrate_test(double a, double b, double t)
{
BetaCDF_Re f1(a, b, t);
double err_est1;
int err_code1;
const double res1 = integrate(f1, 0, 1, err_est1, err_code1,
100, 1e-4, 1e-4,
Integrator<double>::GaussKronrod201);
BetaCDF_Im f2(a, b, t);
double err_est2;
int err_code2;
const double res2 = integrate(f2, 0, 1, err_est2, err_code2,
100, 1e-4, 1e-4,
Integrator<double>::GaussKronrod201);
return Rcpp::List::create(
Rcpp::Named("realPart") =
Rcpp::List::create(
Rcpp::Named("value") = res1,
Rcpp::Named("error_estimate") = err_est1,
Rcpp::Named("error_code") = err_code1
),
Rcpp::Named("imPart") =
Rcpp::List::create(
Rcpp::Named("value") = res2,
Rcpp::Named("error_estimate") = err_est2,
Rcpp::Named("error_code") = err_code2
)
);
}
> integrate_test(1, 0.5, 1)
$realPart
$realPart$value
[1] 0.7497983
$realPart$error_estimate
[1] 7.110548e-07
$realPart$error_code
[1] 0
$imPart
$imPart$value
[1] 0.5934922
$imPart$error_estimate
[1] 5.54721e-07
$imPart$error_code
[1] 0
简介:
t <- seq(-100, 100, length.out = 501)
x <- lapply(t, function(t) integrate_test(1,0.5,t))
realparts <- unlist(purrr::transpose(purrr::transpose(x)$realPart)$value)
imparts <- unlist(purrr::transpose(purrr::transpose(x)$imPart)$value)
plot(t, realparts, type="l", col="blue", ylim=c(-1,1))
lines(t, imparts, type="l", col="red")