Displaying 20 results from an estimated 900 matches similar to: "segmentation fault in integrate (PR#812)"
2007 Oct 29
1
meaning of lenwrk value in adapt function
R-listers,
In using the adapt function, I am getting the following warning:
Ifail=2, lenwrk was too small. -- fix adapt() !
Check the returned relerr! in: adapt(ndim = 2, lower = lower.limit,
upper = upper.limit, functn = pr.set,
Would someone explain what the 'lenwrk' value indicates in order to help
diagnose this issue.
Also, what are the possible codes for Ifail, so I can set
2007 Mar 28
1
warnings on adapt
Hi all
I was wondering if someone could help me.
I have to estimate some parameters, so I am using the function nlm. Inside
this function I have to integrate, hence
I am using the function adapt.
I don't understand why it is giving the following warnings:
At the beginning:
Warning: a final empty element has been omitted
the part of the args list of 'c' being evaluated was:
2002 Jul 14
1
help with adapt function
Dear People,
I'm trying to use the function adapt, from the adapt library package,
which does multidimensional numerical integration. I think I must be using
the wrong syntax or something, because even a simple example does not
work. Consider
foo <- function(x){x[1]*x[2]}
and
adapt(2, lo = c(-1,-1), up = c(1,1), functn = foo)
This simply hangs. A more complicated example crashes R,
2001 Mar 08
1
inconsistent results when calling functions with other func (PR#869)
Hello Bug people,
I have an unexpected behavior and am unsure whether the problem is in my
thinking, my implementation or the program R.
Basically I get two different answers depending on how I call a function
which takes other functions as arguments as indicated below.
To me it should make no difference if f is a function that returns the
function g then z(f(x)) whould give the same as
y<-
2006 Nov 18
1
Questions regarding "integrate" function
Hi there. Thanks for your time in advance.
I am using R 2.2.0 and OS: Windows XP.
My final goal is to calculate 1/2*integral of
(f1(x)^1/2-f2(x)^(1/2))^2dx (Latex codes:
$\frac{1}{2}\int^{{\infty}}_{\infty}
(\sqrt{f_1(x)}-\sqrt{f_2(x)})^2dx $.) where f1(x) and f2(x) are two
marginal densities.
My problem:
I have the following R codes using "adapt" package. Although "adapt"
2007 Nov 14
0
R Crashes on certain calls of Adapt
I'm having trouble with adapt. I'm trying to use it in a Bayesian setting,
to integrate the posterior distribution, and to find posterior means. I
tried using the following script, and things went ok:
data = rnorm(100,0.2,1.1)
data = c(data,rnorm(10,3,1))
data = data[abs(data)<2*sd(data)]
prior = function(x){
dgamma(x[2],shape=2,scale=1)*dnorm(x[1],0,.5)
}
liklihood =
2000 Jan 19
1
Segmentation fault using integrate()
Hi all,
Running R 0.90.1 on a RH 6.1 system. Installation of the
integrate_2.1-2 package went smoothly. My code contains a loop
in which integrate() is called several times in each pass.
I get a segmentation fault after what seems to be a random number
of calls to integrate(). Debug output shows:
Program received signal SIGSEGV, Segmentation fault.
promiseArgs (el=0x40276414,
2004 Jul 27
1
Integration with "adapt"
Hi all,
I need to calculate a multidimensional integration on R. I am using the
command "adapt" (from library adapt), although sometimes I get the
following error message:
Ifail=2, lenwrk was too small. -- fix adapt() !
Check the returned relerr! in: adapt(3, linf, lsup, functn = Integrando1)
I guess it happens because the domain of integration is too small,
although I tried a
2010 Feb 09
2
Double Integral Minimization Problem
Hello all,
I am trying to minimize a function which contains a double integral, using
"nlminb" for the minimization and "adapt" for the integral. The integral is
over two variables (thita and radiusb)
and the 3 free parameters I want to derive from the minimization are
counts0, index and radius_eff.
I have used both tasks in the past successfully but this is the first time
2006 May 05
2
double integral
Dear r-users,
Is there any command in R allowing to evaluate a double integral? for
instance let say I want to evaluate the following integral:
integrate[lo=(0,1),up=(2,3)] f(x,y)=x^2+y^2
where lo is the vector of lower bounds and up that of upper bounds.
I thaught the function "adapt" would work but it did not.
Many thanks,
Dominique K.
2005 Sep 05
3
numerical intergation
how does one numerically intergate the following:
A=function(x,y)
{
xy
}
over the range: 2<x<0 4<y<10
say.
ie how would one set up the integrate function?
i forgot!
2007 Feb 13
1
Multidimensional Integration over arbitrary sets
Hi,
I need to integrate a 2D function over range where the limits depend
on the other e.g integrate f(x,y)=x*y over {x,0,1} and {y,x,1}.
i.e \int_0^1 \int_x^1 xy dydx
I checked adapt but it doesn't seem to help here. Are they any
packages for this sort of thing?
I tried RSitesearch but couldn't find the answer to this.
Many thanks for you help.
Regards
Saptarshi
Saptarshi Guha
2006 Nov 17
0
Question regarding "integrate" function
Hi there. Thanks for your time in advance.
My final goal is to calculate 1/2*integral of
(f1(x)^1/2-f2(x)^(1/2))^2dx (Latex codes:
$\frac{1}{2}\int^{{\infty}}_{\infty} (\sqrt{f_1(x)}-\sqrt{f_2(x)})^2dx
$.) where f1(x) and f2(x) are two estimated marginal densities.
My problem:
I have the following R codes using "adapt" package. Although "adapt"
function is mainly designed
2006 Nov 17
0
questions regarding "integrate" function in R
Hi there. Thanks for your time in advance.
My final goal is to calculate 1/2*integral of
(f1(x)^1/2-f2(x)^(1/2))^2dx (Latex codes:
$\frac{1}{2}\int^{{\infty}}_{\infty}
(\sqrt{f_1(x)}-\sqrt{f_2(x)})^2dx $.) where f1(x) and f2(x) are two
marginal densities.
My problem:
I have the following R codes using "adapt" package. Although "adapt"
function is mainly designed for more
2007 Jul 07
2
No convergence using ADAPT
I am trying calculate a probability using numerical integration. The first
program I ran spit out an answer in a very short time. The program is below:
## START PROGRAM
trial <- function(input)
{
pmvnorm(lower = c(0,0), upper = c(2, 2), mean = input, sigma = matrix(c(.1, 0,
0, .1), nrow = 2, ncol = 2, byrow = FALSE))
}
require(mvtnorm)
require(adapt)
bottomB <- -5*sqrt(.1)
topB <-
2007 Apr 05
1
binom.test() query
Hi Folks,
The recent correspondence about "strange fisher.test result",
and especially Peter Dalgaard's reply on Tue 03 April 2007
(which I want to investigate further) led me to take a close
look at the code for binom.test().
I now have a query!
The code for the two-sided case computes the p-value as follows:
if (p == 0) (x == 0)
else
if (p == 1) (x == n)
2000 Apr 15
0
problem with function involving ifelse and integrate
Dear R people,
There is probably a simple explanation for the following, but I have been
unable to come up with one.
I want to integrate x(1-x)^{-1/3} over intervals of the form [0,a] where a
is between 0 and 1.
Hence, consider:
fm <- function(x) ifelse(x==0 | x==1 ,0,(x*(1-x))^(-1/3))
inbeta <- function(x)
{
ifelse(x==0,0,integrate(fm,0,x,maxpts = NULL, eps=0.01))
}
Comments:
2002 Jul 08
0
factanal results interpretation - am I right here?
Hi,
I have obtained some results with factanal that seem to support a hypothesis I already had, and I'd like to verify that I can indeed conclude this from this new analysis.
We had subjects reproduce perceived trajectories with a device that allowed us to measure spatial position (the path) and the device's orientation at any of those positions. From this, we calculated the rotation of
2008 Oct 19
1
multivariate integral with ADAPT when the parameter is close to boundary
Dear All,
There is one problem I encountered when I used ADAPT to compute some
2-D integral w.r.t beta density.
For example, when I try to run the following comments:
fun2<-function(theta){return(dbeta(theta[1],0.005,0.005)*dbeta(theta[2],0.005,0.005))}
int.fun2<-adapt(ndim=2,lo = c(0,0), up = c(1,1),functn = fun2,eps = 1e-4)
It seems it will take very long time to run. Acturally, I
2003 Apr 26
2
Multiple Integration
Dear all,
May I do multiple integration using R? I was looking
adapt but it is saying it integrates a scalar function
over a multidimensional rectangle. I have integrand of
several variable and upper, lower limit too variable.
I wanted to see the result using adapt (though it is
not for this purpose, I suppose)
Func<-function(x){(x[1]*x[2])}
adapt(2, lo=c(0,1), up=c(1,x[1]), functn=Func)
it