Displaying 8 results from an estimated 8 matches for "nmin".
Did you mean:
  min
  
2006 Jan 23
1
proposed pbirthday fix
...t; n) return(0)
    if (n > classes * (coincident - 1)) return(1)
    eps <- 1e-14
    if (qbirthday(1 - eps, classes, coincident) <= n)
        return(1 - eps)
    f <- function(p) qbirthday(p, c, k) - n
    lower <- 0
    upper <- min( exp( k * log(n) - (k-1) * log(c) ), 1 )
    nmin <- uniroot(f, c(lower, upper), tol = eps)
    nmin$root
}
Ken
2006 Sep 01
1
integration problem with gamma function
...-----------------------------------------
# Success rates and integration bounds in the case
# of the (conservative) Bayes-Laplace prior
# --------------------------------------------------
SucRatesIntBounds <- function(Ni, Si, Nii, Sii, smin)
{
# BEGIN BLOCK
# necessary variables:
# {Nmax, Nmin}
### defintion of constants
Di <- (Si + 1) / (Ni + 2)
si <- sqrt(Di * (1 - Di) / (Ni + 3))
Dii <- (Sii + 1) / (Nii + 2)
sii <- sqrt(Dii * (1 - Dii) / (Nii + 3))
Nmax <- max(Ni, Nii)
Nmin <- min(Ni, Nii)
sL <- floor(1000 * sqrt((Nmax+1) / (Nmax+3)) / (Nmax + 2)) / 1000
sH <...
2011 Jan 06
1
Cross validation for Ordinary Kriging
...ords do not match
I don't know what is wrong. The x2 data is a SpatialPointsdataframe that is why 
i did not specify the location (as it will take it from the data). Here is the 
usage of the function krige.cv:
krige.cv(formula, locations, data, model = NULL, beta = NULL, nmax = Inf, 
        nmin = 0, maxdist = Inf, nfold = nrow(data), verbose = TRUE, ...)
I hope you can help me on this. Thanks a lot.
Best regards,
Pearl
      
	[[alternative HTML version deleted]]
2002 Feb 11
0
profile
...e:
Loading required package: splines
Error in interpSpline.default(obj[[i]]$par.vals[,i], obj[[i]]$tau 
Thank you for your info
Katarina
My code in full is: 
(Note: I'm just using simulated data in this example, and the profile  will
sometimes work with this)
# parameter assignments 
       Nmin      <- 0.8852 
       Nopt1     <- 16.78 
       gN <- 0.5511 
       E.nfert1 <- 0.3271 
       E.nfert2 <- 0.6132 
       Beta <- 0.8902 
       Dls <- 0.5378 
       eta1 <- 0.3791 
       eta2 <- 0.6332 
       PopStd <- 90468 
       beta <- Beta 
       DIs &...
2007 Jan 22
0
Recursive-SVM (R-SVM)
...<- function(filename)
{
dd <- read.table( filename, header=F, skip=1)
x <- as.matrix( dd[, 1:(ncol(dd)-1)] ) 
y <- factor( dd[, ncol(dd)] )
ret <- list(x=x, y=y)
}
## create a decreasing ladder for recursive feature elimination
CreatLadder <- function( Ntotal, pRatio=0.75, Nmin=5 )
{
x <- vector()
x[1] <- Ntotal
for( i in 1:100 )
{
pp <- round(x[i] * pRatio)
if( pp == x[i] )
{
pp <- pp-1
} 
if( pp >= Nmin )
{
x[i+1] <- pp
} else
{
break
}
}
x
}
## R-SVM core code
## input:
## x: row matrix of data
## y: class label: 1 / -1 for 2 c...
2006 Jun 23
1
How to use mle or similar with integrate?
Hi
I have the following formula (I hope it is clear - if no, I can try to
do better the next time)
h(x, a, b) =
integral(0 to pi/2)
(
  (
    integral(D/sin(alpha) to Inf)
    (
      (
        f(x, a, b)
      )
      dx
    )
  dalpha
)
and I want to do an mle with it.
I know how to use mle() and I also know about integrate(). My problem is
to give the parameter values a and b to the
2002 Mar 01
4
UI regression
Hi,
Earlier this year I "upgraded" from wine 20010510 to 20011226 in order
to see if some kind of resource leak was fixed which caused screen 
redraws to get progressively slower and slower and slower and slower, ....
That was fixed but there seemed to be a significant number of graphics
and UI regressions. I've just upgraded to 20020228 to see if things
were any better and within
2016 Jun 01
15
[PATCH 00/15] clk/tegra: improve code and add DFS support
This series adds support for GM20B PLL's Maxwell features, namely glitchless
switch and (more importantly) DFS support. DFS lets the PLL lower its output
speed according to input current variations, making the clock more stable and
allowing it to run safely at lower voltage.
All GM20B additions are done in the last patch, which consequently ends up
being considerably big ; fortunately, it