search for: lwork

Displaying 8 results from an estimated 8 matches for "lwork".

Did you mean: work
2009 Sep 23
2
R + C + Lapack toy regression example
...Lapack for regression. However, i run into an error. My matrix-lapack-example.c file: #include <R_ext/Lapack.h> void reg(const char* trans, const int* m, const int* n, const int* nrhs, double* a, const int* lda, double* b, const int* ldb, double* work, const int* lwork, int* info) { F77_CALL(dgels)(trans, m, n, nrhs, a, lda, b, ldb, work, lwork, info); } My matrix-lapack-example.R file: dyn.load( "matrix-lapack-example.so" ) regression <- function( X, Y ){ m <- nrow( X ) n <- ncol( X ) stopifnot( m >= n , is.vector( Y ), n != lengt...
2009 Mar 25
2
Listing of LAPACK error codes
...bout the meaning and handling of error codes 1 and 2. In Lapack.c I only see the reference to the variable info in certain Fortran code: F77_CALL(dsyevr)(jobv, range, uplo, &n, rx, &n, &vl, &vu, &il, &iu, &abstol, &m, rvalues, rz, &n, isuppz, &tmp, &lwork, &itmp, &liwork, &info); if (info != 0) error(_("error code %d from Lapack routine '%s'"), info, "dsyevr"); lwork = (int) tmp; liwork = itmp; work = (double *) R_alloc(lwork, sizeof(double)); iwork = (int *) R_alloc(liwork, sizeof...
2003 Apr 22
4
"LAPACK routine DGESDD gave error code -12" with Debian (PR#2822)
Dear All, Under Debian GNU/Linux La.svd (with method = "dgesdd") sometimes gives the error "Error in La.svd(data, nu = 0, nv = min(nrow, ncol), method = "dgesdd") : LAPACK routine DGESDD gave error code -12" It seems not to depend on the data per se, but on the relationship between numbers of rows and columns. For example, if the number of columns is 100,
2003 Jul 18
1
(PR#2867)
...puzzled that the call to dgeqp3 has more arguments than dgeqp3 itself. The call has an extra argument "rwork". But this could explain the strange error code! The call: F77_CALL(dgeqp3)(&m, &n, REAL(A), &m, INTEGER(jpvt), REAL(tau), &tmp, &lwork, rwork, &info); The subroutine: SUBROUTINE DGEQP3( M, N, A, LDA, JPVT, TAU, WORK, LWORK, INFO ) Thanks for R! Regards Richard E. Roger Dr. R. E. Roger NSW Agriculture Spatial Information Officer Systems 161 Kite St Resource Information Unit...
2013 Oct 18
1
The codec can not support multi-thread ?
...Then we write test code for opus-codec which encode a .pcm file simultaneously. and get error. we also write decoder test code. error too. We tested v1.0.2 and 1.0.3, Our codec is a .so file, our main program is written in erlang. we used other codecs such as isac/ilbc/... they are OK. you may try lwork.hk:8086, it is a webRTC demo. so, anybody noticed this? It seems to be a re-entry bug. -------------- next part -------------- An HTML attachment was scrubbed... URL: http://lists.xiph.org/pipermail/opus/attachments/20131018/3aadc00e/attachment.htm
2001 Jun 19
5
core dump on 64-bit Solaris (PR#990)
Using the 64-bit Solaris compilers make check dumps core in La_rs at 73 F77_CALL(dsyev)(jobv, uplo, &n, rx, &n, rvalues, work, &lwork, &info); I can't reproduce it easily, but example(eigen) occasionally stops with Error: abs(sm - V %*% diag(lam) %*% t(V)) < 60 * Meps is not TRUE which might be connected. The tiny rounding errors in example(eigen) aren't constant from time to time, but I don't know if they s...
2004 Aug 11
0
Calling Lapack From C code
Hello List, I have create a small package with C code. In the C code, I call Fortran routines of Lapack. Here is the call in the C function: F77_CALL(dgesvd)(&jobu, &jobvt,&size, &size,A, &size, D,U,&size,V,&size,&work1, &lwork,&error); In the src directory, I have a Makevars File with: PKG_LIBS = $(LAPACK_LIBS) $(BLAS_LIBS) $(FLIBS) And in the beginning of C code, I include the following lines #include <stddef.h> #include <math.h> #include <time.h> #include <stdio.h> #include <string.h&...
2001 Jul 17
2
cmdscale in package mva (PR#1027)
Full_Name: Laurent Gautier Version: 1.3.0-patched OS: IRIX 6.5 Submission from: (NULL) (130.225.67.199) Hello, The function La.eigen, called by cmdscale in the package mva behaves an unexplicable way (for me). The following lines show what happened. I tried the very same on linux, and it worked fine. >a <- matrix(c(1,2,3,2),3,3) >a [,1] [,2] [,3] [1,] 1 2 3 [2,]