Displaying 6 results from an estimated 6 matches for "x_max".
Did you mean:
n_max
2019 Jun 24
1
Calculation of e^{z^2/2} for a normal deviate z
...each of dimension d
##' @param l.off the offset to subtract and re-add; ideally in the order of
##' the maximum of each column
##' @return log(x_1 + .. + x_n) [i.e., OF DIMENSION d!!!] computed via
##' log(sum(x)) = log(sum(exp(log(x))))
##' = log(exp(log(x_max))*sum(exp(log(x)-log(x_max))))
##' = log(x_max) + log(sum(exp(log(x)-log(x_max)))))
##' = lx.max + log(sum(exp(lx-lx.max)))
##' => VECTOR OF DIMENSION d
##' @author Marius Hofert, Martin Maechler
lsum <- function(lx, l.off) {
rx <- length(d <-...
2013 Nov 04
0
[LLVMdev] debug metadata for variable length arrays ?
...or (j=0; j<n+3; j++)
aaa[i][j] = (i+j*n)%1023;
return aaa[n-1][0];
}
int main(int argc, char** argv)
{
return vla(argc+5);
}
How do I express range for 'aaa' array ?
I would need this for Fortran like languages where bounds can be defined as:
SUBROUTINE foo(x_min,x_max,y_min,y_max, &
aaa &
)
IMPLICIT NONE
INTEGER :: x_min,x_max,y_min,y_max
REAL(KIND=8), DIMENSION(x_min-2:x_max+2,y_min-2:y_max+2) :: aaa
...
Any advice on how to use debug metadata to generate DWARF for those c...
2010 May 18
4
scaling with relative units in plots or retrieving axes limits in plots
Dears,
a way to define x and y positions in plots in relative numbers (e.g in fractions between 0 and 1 referring to relative positions inside the plot region) would really help me. One example I would need this to would be to add text via text() to a plot always at a defined spot, e.g the upper left corner. Until now I always determined maximum x and y values and used those, but defining
2009 Jul 20
3
Histograms on a log scale
Dear All,
I would like to be able to plot histograms/densities on a semi-log or
log-log scale.
I found several suggestions online
http://tolstoy.newcastle.edu.au/R/help/05/09/12044.html
https://stat.ethz.ch/pipermail/r-help/2002-June/022295.html
http://www.harding.edu/fmccown/R/#histograms
Now, consider the code snippet taken from
http://www.harding.edu/fmccown/R/#histograms
# Get a random
2019 Jun 24
2
Calculation of e^{z^2/2} for a normal deviate z
>>>>> William Dunlap via R-devel
>>>>> on Sun, 23 Jun 2019 10:34:47 -0700 writes:
>>>>> William Dunlap via R-devel
>>>>> on Sun, 23 Jun 2019 10:34:47 -0700 writes:
> include/Rmath.h declares a set of 'logspace' functions for use at the C
> level. I don't think there are core R functions that call
1998 Nov 07
1
simple questions about R (fwd)
...> > First we found the bootstrap estimate of the bias do not seem to work well,
> > then we tried simulation and it also do not work. Here is the details
> > about simulation:
> >
> > Generate 19 min( exp(0.3), 4 ) observations
> > and estimate how big is E (X_max) - 4 = the bias of MLE.
> > Using as much as 5000 to 10000 runs, you get something around -0.158
> > (depending on different seed there is some variation but all
> > between -0.15 and -0.165 )
> >
> > Using Splus (version 3.4 on HP) we get something around -0.35
>...