search for: smin

Displaying 16 results from an estimated 16 matches for "smin".

Did you mean: sbin
2006 Sep 01
1
integration problem with gamma function
...t; # zuerst: 12-06-05 # zuletzt: 21-06-06 # -------------------------------------------------- # 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 *...
2010 Feb 19
3
Date label lost while inverting y axis.
...o do this on this mailing list and I found a response: inverting the ylim parameter of the plot. I did it, the data are displayed correctly, but now the problem is that there is no more labels on the Y axis. How should I proceed to have it back? Here is my code: ******************************* sMin=min(series[,2:3]) sMax=max(series[,2:3]) plot(series[,2],dates,xlim=c(sMin,sMax),ylim=c(max(dates),min(dates)),col="green",main="",type="l",xlab="Value") ******************************* Thanks, -- Jeremie [[alternative HTML version deleted]]
2005 Feb 21
2
speex denoiser adaptation time
Hi Jean Marc & List, So I have been fiddling with the denoiser (again). While poking around I noticed that nb_preprocess is basically a counter that is mod-ded with 100 (the default), which causes Smin[] to be re- seeded with the value in Stmp[] (min of the previous adaptation period). Smin[] is then used to update the noise probability, which is (probably) less likely when adaptation period is shorter. Ok so that I can get from looking at the code- my actual question is why 100 runs (i.e. 2 se...
2012 Dec 05
6
[LLVMdev] max/min intrinsics
...that the implementation could be simplified (and less fragile) if max and min intrinsics were recognized rather than looking for compare-select sequences. The suggestion was to change compare-selects into max and min intrinsic calls during instcombine. The intrinsics to add are: declare iN llvm.{smin,smax}.iN(iN %a, iN %b) declare iN llvm.{umin,umax}.iN(iN %a, iN %b) declare fN llvm.{fmin,fmax}.fN(fN %a, fN %b) What does the community think? Paul
2005 Feb 21
0
speex denoiser adaptation time
...Jean-Marc Le lundi 21 f?vrier 2005 ? 01:11 -0800, Tom Harper a ?crit : > Hi Jean Marc & List, > > So I have been fiddling with the denoiser (again). While poking > around I noticed that nb_preprocess is basically a counter that > is mod-ded with 100 (the default), which causes Smin[] to be re- > seeded with the value in Stmp[] (min of the previous adaptation > period). Smin[] is then used to update the noise probability, which > is (probably) less likely when adaptation period is shorter. > > Ok so that I can get from looking at the code- my actual question i...
2006 Jul 20
1
hist or barplot
Hi all, I wish to draw 2 hist (or barplot) on the same graph. I can do it simply by using par(new=TRUE) , but it overlap with the first drawn, how to tell R to put in front of the graph the min value of the two graph in order for it to be seen and don't hide each other. I've been looking at help for barplot or hist but didn't find anything... (or my english is too poor to
2014 Dec 18
2
[LLVMdev] missing optimization for icmps in induction variables?
...kick in). Is the above reasoning correct? If it is, what is the right place to add this logic to? I'm thinking ScalarEvolution (so that this gets picked up by SimplifyIndVar), but maybe there is a more idiomatic place? The case above is a simplified form of my real workload, which involves smin and smax expressions; so the implementation has to be easily generalizable to such cases. Thanks, -- Sanjoy
2007 Sep 17
1
Possible fixed point overflow/div 0 preprocess.c
...sed resolution: The SpeexPreprocessState_ member 'nb_adapt' is only checked in a couple of places and mostly for initial conditions such as within update_noise_prob below: <preprocess.c update_noise_prob> ... if (st->nb_adapt==1) { for (i=0;i<N;i++) st->Smin[i] = st->Stmp[i] = 0; } if (st->nb_adapt < 100) min_range = 15; else if (st->nb_adapt < 1000) min_range = 50; else if (st->nb_adapt < 10000) min_range = 150; else min_range = 300; ... </> Maybe something like this is required withi...
2015 Jan 08
2
[LLVMdev] missing optimization for icmps in induction variables?
...orrect? If it is, what is the right place to >> add this logic to? I'm thinking ScalarEvolution (so that this gets >> picked up by SimplifyIndVar), but maybe there is a more idiomatic >> place? The case above is a simplified form of my real workload, which >> involves smin and smax expressions; so the implementation has to be >> easily generalizable to such cases. > > > Before reading your two steps I was going to suggest jump threading. Jump > threading is where we optimize redundant tests across blocks that feed into > branches (block A tests p...
2012 Jul 17
1
Threshold Quantile Regression code CRASHES in R
...1:qn){ d <- (q<=qs[r]) xx <- (x)*(d%*%matrix(1,1,k)) xx <- xx-x%*%rq(xx~x,tau)$coefficients[2]-rq(xx~x,tau)$coefficients[1] ex <- e-xx%*%rq(e~xx,tau)$coefficients[2]-rq(e~xx,tau)$coefficients[1] exw <- ex*(tau-(ex<0)) sn[r] <- sum(exw) } r <- which.min(sn) smin <- sn[r] qhat <- qs[r] d <- (q<=qhat) x1 <- x*(d%*%matrix(1,1,k)) x2 <- x*((1-d)%*%matrix(1,1,k)) beta1 <- rq(y~x1,tau)$coefficients[2] beta2 <- rq(y~x2,tau)$coefficients[2] yhat <- x1%*%beta1+x2%*%beta2 list(yhat=yhat,qhat=qhat) }#Threshold Estimation with two independe...
2019 May 11
1
R problems with lapack with gfortran
...ntain prototypes like int ilaenv_ (int *ispec, char *name, char *opts, int *n1, int *n2, int *n3, int *n4, size_t name_len, size_t opts_len); void dlacn2_ (int *n, double *v, double *x, int *isgn, double *est, int *kase, int *isave); void dlaln2_ (int_least32_t *ltrans, int *na, int *nw, double *smin, double *ca, double *a, int *lda, double *d1, double *d2, double *b, int *ldb, double *wr, double *wi, double *x, int *ldx, double *scale, double *xnorm, int *info); void dlabad_ (double *small, double *large); void drscl_ (int *n, double *sa, double *sx, int *incx); void dlatrs_ (char *uplo, ch...
2012 Dec 05
0
[LLVMdev] max/min intrinsics
...could be simplified (and less fragile) if max and min intrinsics were recognized rather than looking for compare-select sequences. > > The suggestion was to change compare-selects into max and min intrinsic calls during instcombine. > > The intrinsics to add are: > declare iN llvm.{smin,smax}.iN(iN %a, iN %b) > declare iN llvm.{umin,umax}.iN(iN %a, iN %b) > declare fN llvm.{fmin,fmax}.fN(fN %a, fN %b) > > What does the community think? It seems inevitable. For the floating point version, please make it very clear what the behavior of max(-0,+0) and related cases are...
2012 Jul 18
2
loop searching the id corresponding to the given index (timestamp)
.... OYT", "S. pinniger", "S. serriceps", "E. jacksoni", "B. frenatus", "H. decagrammus", "S. rastrelliger"), name_2008 = c("ELAT", "OPIC", "SATR", "SCAR", "SCAU", "SCHR", "SMIN", "SMYS", "OYT", "SPIN", "STRE", "EJAC", "BFRE", "HDEC", "SRAS"), description = c("Striped Surfperch,", "Painted Greenling,", "kelp rockfish,", "gopher rockfish,", "copp...
2019 May 04
4
R problems with lapack with gfortran
On Sat, May 04, 2019 at 06:42:47PM +0200, Thomas K?nig wrote: > > > - figure out Fortran2003 specification for C/Fortran interoperability > > -- this _sounds_ like the right solution, but I don't think many > > understand how to use it and what is implied (in particular, will > > it require making changes to LAPACK itself?) > > That would actually be fairly
2012 Jul 16
3
[LLVMdev] RFC: LLVM incubation, or requirements for committing new backends
...arget/AMDGPU/AMDILVersion.td > llvm/trunk/lib/Target/AMDGPU/CMakeLists.txt > llvm/trunk/lib/Target/AMDGPU/GENERATED_FILES > llvm/trunk/lib/Target/AMDGPU/LLVMBuild.txt > llvm/trunk/lib/Target/AMDGPU/MCTargetDesc/ > llvm/trunk/lib/Target/AMDGPU/MCTargetDesc/AMDGPUMCAsmInfo.cpp > llvm/trunk/lib/Target/AMDGPU/MCTargetDesc/AMDGPUMCAsmInfo.h > llvm/trunk/lib/Target/AMDGPU/MCTargetDesc/AMDGPUMCTargetDesc.cpp > llvm/trunk/lib/Target/AMDGPU/MCTargetDesc/AMDGPUMCTargetDesc.h > llvm/trunk/lib/Target/AMDGPU/MCTargetDesc/CMakeLists.txt > llv...
2019 Apr 05
4
[RFC] Changes to llvm.experimental.vector.reduce intrinsics
On 05/04/2019 09:37, Simon Pilgrim via llvm-dev wrote: > On 04/04/2019 14:11, Sander De Smalen wrote: >> Proposed change: >> >> ---------------------------- >> >> In this RFC I propose changing the intrinsics for >> llvm.experimental.vector.reduce.fadd and >> llvm.experimental.vector.reduce.fmul (see options A and B). I also >> propose renaming