Displaying 15 results from an estimated 15 matches for "relerr".
Did you mean:
referr
2002 Jul 08
0
factanal results interpretation - am I right here?
...e), the total yaw (total rotation of the device), and the average orientation relative to the path (e.g. 0deg for "tangential", 90deg. for inward or outward). We analysed the errors in these measures, compared to the presented values, and normalised to the total perceived amount of yaw:
yrelerr.PathRot, relerr.Yaw and relerr.PathRel.Orn
Additionally, we calculated measures of overlap (more exactly: average pointwise distance after maximising overlap): Spat for the path, Orn for the orientation; there were combined into FD=sqrt(Spat^2+Orn^2).
Earlier analysis had suggested that subjects...
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,
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 some traps in
my code to handle them correctly.
I apo...
2007 Apr 05
1
binom.test() query
...y 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)
else {
relErr <- 1 + 1e-07
d <- dbinom(x, n, p)
m <- n * p
if (x == m) 1
else
## PVAL if x < m
if (x < m) {
i <- seq(from = ceiling(m), to = n)
y <- sum(dbinom(i, n, p) <= d * relErr)
## here:...
2007 Mar 28
1
warnings on adapt
...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:
(paste("Ifail=2, lenwrk was too small. -- fix adapt() !\n", "Check the
returned relerr!"), "Ifail=3: ndim > 20 -- rewrite the fortran code ;-)
!", "Ifail=4, minpts > maxpts; should not happen!", "Ifail=5, internal
non-convergence; should not happen!", )
When it finishes:
Warning messages:
1: Ifail=2, lenwrk was too small. -- fix adapt() !
C...
2001 Mar 08
1
inconsistent results when calling functions with other func (PR#869)
...function(x)
+ { a <- x[1]
+ kc <- x[2]
+ f(a) * g(kc) * H(a,kc) }
+
adapt(2,lower.limits,upper.limits,minpts=200,maxpts=20000,prob.of.fracture,e
ps=1e-3) }
>
risk(eifs.at.time.using.density(5000,eifs,1e-4,2),g,H,c(0.001,20),c(.5,60))
[1] 1.999471
value relerr minpts lenwrk ifail
28.39852 0.0003455776 627 2803 0
>
> eifs.5000 <- eifs.at.time.using.density(5000,eifs,1e-4,2)
[1] 1.999471
> risk(eifs.5000,g,H,c(0.001,20),c(.5,60))
value relerr minpts lenwrk ifa...
2000 Feb 14
0
a nls(~...) question for R-0.90.1 (redhat-linux)
...partment phone: (902)494-1694
Dalhousie University fax: (902)494-2885
Halifax, NS, CANADA, B3H 4J1 http://www.phys.ocean.dal.ca/~kelley
-------------- next part --------------
# Demonstrate problem using nls(), yielding the error:
#
# Error in relerr(A, B, x, y) : Object "A" not found
#
#
# QUESTION: any advice as to how I can make this work?
#
# PS: For reference, I'm trying to copy what's in section 10.3
# of Chambers and Hastie's 'Statistical models in S', and my
# platform is redhat-linux version 6.1, with R v...
2001 Jan 11
1
segmentation fault in integrate (PR#812)
...t; dummy(-10000)
[1] NaN
If I choose the lower boundary to be too small integrate causes a
segmentation fault:
> library(integrate)
> integrate(dummy, -100, 0)$value
[1] 1.387143
> integrate(dummy, -1000, 0)$value
[1] NaN
Warning message:
Ifail=1, maxpts was too small. Check the returned relerr! in: adapt(1,
lower, upper, minpts, maxpts, functn, eps, ...)
> integrate(dummy, -10000, 0)$value
Segmentation fault
I'm running R.1.2.0 on Debian Linux.
Regards
Achim
> version
_
platform i686-pc-linux-gnu
arch i686
os linux-gnu...
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 change of variables to avoid this problem and it didn?t
help. The command adapt calls a fortran routine, but I don?t know fortran
enough to fix the problem.
Can som...
2007 Nov 14
0
R Crashes on certain calls of Adapt
...his produces the error:
*** caught segfault ***
address 0x7eaa8580, cause 'memory not mapped'
Traceback:
1: .C("cadapt", as.integer(ndim), as.double(lower), as.double(upper),
minpts = as.integer(minpts), maxpts = as.integer(maxpts), ff, rho =
environment(), as.double(eps), relerr = double(1), lenwrk =
as.integer(lenwrk),
value = double(1), ifail = integer(1), PACKAGE = "adapt")
2: adapt(2, c(-5, 0, -0.5), c(5, 10, 0.5), f = unsc.post, max = 5e+05,
val = data)
On a perhaps related note, if I increase the length of data to 1000+10 in
the original example,...
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!
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.
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
2005 Aug 27
2
two-tailed exact binomail test
I am trying to find a definition for the two-tailed exact binomial test but have been unsuccessful. Can you help?
---------------------------------
[[alternative HTML version deleted]]
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,