search for: imax

Displaying 20 results from an estimated 45 matches for "imax".

Did you mean: imap
2013 Apr 26
2
speed of a vector operation question
Hello, I am dealing with numeric vectors 10^5 to 10^6 elements long. The values are sorted (with duplicates) in the vector (v). I am obtaining the length of vectors such as (v < c) or (v > c1 & v < c2), where c, c1, c2 are some scalar variables. What is the most efficient way to do this? I am using sum(v < c) since TRUE's are 1's and FALSE's are 0's. This
2002 Nov 19
1
fexact.c
...her files (e.g., to not need to include R.h and ctest.h ---now I only include the R files Boolean.h, Constants.h, and Memory.h), I have re-written all declarations of Sints as ints and, what is potentially more serious, I have re-written the line (lines 329 and 330, in fexact.c on R-1.6.1) /* IMAX is the largest representable Sint on the machine. */ const Sint imax = SINT_MAX; as const Sint imax = 2147483647; I have checked the program on an Intel machine (running Linux and compiled with gcc) and on an SGI machine running Irix 5.6 (compiled with gcc and, I think, using 32 bits...
2012 Feb 15
0
[LLVMdev] Performance problems with FORTRAN allocatable arrays
...'ve noticed that LLVM does a bad job of optimizing array indexing > code for FORTRAN arrays declared using the ALLOCATABLE keyword. > > For example if you have something like the following: > > DOUBLE PRECISION,ALLOCATABLE,DIMENSION(:,:,:,:) :: QAV > ... > ALLOCATE( QAV( -2:IMAX+2,-2:JMAX+2,-2:KMAX+2,ND) ) > ... > DO L = 1, 5 > DO K = K1, K2 > DO J = J1, J2 > DO I = I1, I2 > II = I + IADD > IBD = II - IBDD > ICD = II + IBDD > > QAV(I,J,K,L) = R6I * (2.0D0 * Q(IBD,J,K,L,...
2012 Feb 15
2
[LLVMdev] Performance problems with FORTRAN allocatable arrays
I've noticed that LLVM does a bad job of optimizing array indexing code for FORTRAN arrays declared using the ALLOCATABLE keyword. For example if you have something like the following: DOUBLE PRECISION,ALLOCATABLE,DIMENSION(:,:,:,:) :: QAV ... ALLOCATE( QAV( -2:IMAX+2,-2:JMAX+2,-2:KMAX+2,ND) ) ... DO L = 1, 5 DO K = K1, K2 DO J = J1, J2 DO I = I1, I2 II = I + IADD IBD = II - IBDD ICD = II + IBDD QAV(I,J,K,L) = R6I * (2.0D0 * Q(IBD,J,K,L,N) + > 5.0D0 * Q(...
2010 Mar 09
2
speed
...i/File:Mandelbrot_Creation_Animation_%28800x600%29.gif When I run this code on my computer it takes few seconds. I wanted to make similar program in Maxima CAS : http://thread.gmane.org/gmane.comp.mathematics.maxima.general/29949/focus=29968 for example : f(x,y,n) := block([i:0, c:x+y*%i,ER:4,iMax:n,z:0], while abs(z)<ER and i<iMax do (z:z*z + c,i:i+1), min(ER,abs(z)))$ wxanimate_draw3d( n, 5, enhanced3d=true, user_preamble="set pm3d at b; set view map", xu_grid=70, yv_grid=70, explicit('f(x,y,n), x, -2, 0.7, y, -1.2, 1.2))$ But it takes s...
2012 Jul 11
0
declaring negative log likelihood of a distribution
...#here a and b are the parameters to be estimated and x=binomial values, fre=frequencies and n=binomial trials #and since the inner series is a convergent infinite series, a large number like 1000 is defined as the maximum #with for loop *>Loglik.newdis2<-function(x,a,b,fre,n,imax) { term<-0 for (i in 0:imax) { term=term+(((-1)**i)*(choose(b-1,i))*(beta(x+a+a*i,n-x+1))) } dens=a*b*choose(n,x)*term KBLL2<-sum(fre*log(dens)) return(-KBLL2) } * #Now to estimate the parameters, I used http://rgm2.lab...
2010 Apr 15
0
[LLVMdev] darwin dragon-egg build issues
Duncan, Do a quick check here on x86_64-apple-darwin10 with svn llvm and svn dragon-egg against release gcc 4.5.0, the results from the himenoBMTxpa benchmark compiled at -O3 look pretty good. With stock gcc-4.5.0, we get... Grid-size = M mimax = 128 mjmax = 128 mkmax = 256 imax = 127 jmax = 127 kmax =255 Start rehearsal measurement process. Measure the performance in 3 times. MFLOPS: 156.560865 time(s): 2.575476 1.733593e-03 Now, start the actual measurement process. The loop will be excuted in 69 times This will take about one m...
2010 Apr 13
2
[LLVMdev] darwin dragon-egg build issues
Hi Peter, > Why not do this too? I've applied this - thanks for the patch! Ciao, Duncan.
2012 Jul 17
0
Maximum Likelihood estimation of KB distribution
...I need to estimate the paramters (alpha and beta) of this distribution(Known as Kumaraswamy binomial Distribution, A Binomial Like Distribution). For that, in order to use *optim()*, I first declared the Negative Log-likelihood of this distribution as follows; *Loglik.newdis2<-function(x,a,b,n,imax) { term<-0 for (i in 0:imax) { term=term+(((-1)**i)*(choose(b-1,i))*(beta(x+a+a*i,n-x+1))) } dens=a*b*choose(n,x)*term KBLL2<-sum(log(dens)) return(-KBLL2) } * since there is an infinite convergent series in this PMF, I decid...
2003 Feb 26
7
XFS vs. ext3
...me with any replies or questions. Thanks.) (The last four paragraphs contain the interesting bits. Basically, XFS hath kick-ed the *ss of ext3 under conditions that are, for our company, critical.) Some listees might be interested in some testing I did the other day, XFS vs. ext3. In our last IMAX film project, right at crunch time, we were getting a whole bunch of dropped frames during compositing. Our compositing program would report "invalid file" partway through writing, and move on to the next frame. A year earlier we had done a very similar project, and stressed the system...
2010 Jan 11
1
K-means recluster data with given cluster centers
...d save them to file #---INITIAL CLUSTERING TO FIND CLUSTER CENTERS # LOAD LIB library(cluster) # LOAD DATA data_unclean <- read.table("dataset1.dat") data.matrix<-as.matrix(data_unclean,"any") # CLUSTER Nclust <- 100 # amount cluster centers Imax <- 200 # amount of iteration for convergence of clustering set.seed(100) # set seed of random nr generator init <- sample(dim(data.matrix)[1], Nclust) # this is the initial Nclust prototypes km <- kmeans(data.matrix, centers=data.matrix[init,], iter.max=Imax) # WRITE OUT CLUST...
2007 Nov 26
0
Winbind / AIX 5.3 returns incomplete user informations
...is our main problem. winuser1@srv1:/# id uid=10013(winuser1) gid=10002(domain users) # while id <user> returns the full list : winuser1@srv1:/$ id winuser1 uid=10013(winuser1) gid=10002(domain users) groups=10283(lint-lecsysteme-gpic-inventaire),10277(lint-lecsysteme),10224(lint-lec ysteme-imax),10186(lint-lecsysteme-gpic),10162(lint-lecsysteme-txtele),10132(gint-app-lecinstructdocfisc),10119(gint-prd-lecs steme-txtele),10118(gint-dev-lecconstatsinfractions),10819(gsamba),10106(gint-prd-lecsysteme),10101(gint-prd-lecresshum-abonn bus),10094(gint-prd-lecsysteme-gpic),10090(gint-prd-lecsyst...
2005 Feb 27
1
Re: smb_proc_readX_data
/* Cc: samba list */ Vincent Marty wrote: > Hi Ogi ! > Did you find a solution to the problem you described in a post in > linux.samba in dec 2004 ? > I get the same messages from Fedora Core 3 when accessing to a iMax > under Mac Os 10.3. Hi! Since I started to use Debian kernel 2.6.10 (in unstable), the problem disappeared. Fedora Core 3 uses 2.6.10 too so I don't know what to tell you. Debian kernels have many patches applied though. BTW this problem is filed in Debian BTS: http://bugs.debian....
2004 Sep 19
2
HD WMV9 videos for download...
...aterial i've found on the net... so it's also useful for me to use as source material for testing high res transcoding in theora... and 6 channel audio in the highest res. The system requirements are pretty high though ! Plus theres some pretty cool vids among them... quite a bit of old IMAX footage. Cheers, Zen.
2001 May 29
2
Using "R" to find peaks in sampled data
This is probably a trivial question, but I did not see it in the FAQs. Perhaps I simply need to be pointed to some URLs. In any case, I have some sampled data that has peaks, and I would like to extract peak height, location, and width, according to almost any statistical model. Gaussian would seem to make the most sense. There can also be "steps" increasing the amplitude over a
2003 Sep 17
1
plot.hclust: dendrogram too large for window (PR#4197)
...quot;, and the dendrogram sometimes doesn't fit within the window. I propose the fix listed below. src/main/ --- plot.c Wed Sep 17 01:03:39 2003 +++ plot.c.new Wed Sep 17 01:21:59 2003 @@ -3314,7 +3314,7 @@ SEXP do_dendwindow(SEXP call, SEXP op, SEXP args, SEXP env) { int i, imax, n; - double pin, *ll, tmp, yval, *y, ymin, ymax, yrange; + double pin, *ll, tmp, yval, *y, ymin, ymax, yrange, m; SEXP originalArgs, merge, height, llabels, str; char *vmax; DevDesc *dd; @@ -3357,8 +3357,14 @@ ll = (double*)R_alloc(n, sizeof(double)); dnd_lptr = &am...
2014 Jun 04
4
opus_multistream_encode_float not working in libopus 1.1
On Wed, Jun 4, 2014 at 4:31 PM, Timothy B. Terriberry <tterribe at xiph.org> wrote: > Alpha Thinktink wrote: >> max_data_bytes=-11 > > That value is passed in by you. I also don't think passing such a value > would have worked in earlier releases. It indicates the size of the > buffer you are passing to the encoder to receive the encoded output. Actually, I'm
2014 Apr 15
6
[PATCH 0/3] misc. cleanup
Hello, some misc. cleanup patches for speexdsp, nothing big I'm not sure about how to submit patches, so this is a test balloon :) ultimately, I'd like to fix the FIXED_POINT issue, see http://lists.xiph.org/pipermail/speex-dev/2013-December/008465.html currently, I think the only way to find out how speexdsp has been compiled is to resample some bytes and observe the output; which is
2014 Apr 15
0
[PATCH 2/3] Use fabsf() instead of fabs() since we have floats, not double
...((x) < -32767 ? -32768 : ((x) > 32766 ? 32767 : (x))) #else -#define WORD2INT(x) ((x) < -32767.5f ? -32768 : ((x) > 32766.5f ? 32767 : floor(.5+(x)))) +#define WORD2INT(x) ((x) < -32767.5f ? -32768 : ((x) > 32766.5f ? 32767 : floorf(.5+(x)))) #endif #define IMAX(a,b) ((a) > (b) ? (a) : (b)) @@ -273,12 +273,12 @@ static spx_word16_t sinc(float cutoff, float x, int N, struct FuncDef *window_fu { /*fprintf (stderr, "%f ", x);*/ float xx = x * cutoff; - if (fabs(x)<1e-6f) + if (fabsf(x)<1e-6f) return WORD2INT(32768.*cutof...
2009 Nov 03
1
Passing Command to Optim in factanal
Hi, I am currently trying to execute the following command: f<-factanal(factors=k$Components$nparallel,covmat=m,n.obs=2287,rotation="varimax",control=list(opt=list(method=c("BFGS")))) but keep getting the error: L-BFGS-B needs finite values of 'fn' I can't figure out what I am doing wrong here, why isn't optim being told to use BFGS instead of L-BFGS-B... Any help would be very muc appreciated. Thanks,...