search for: rcond

Displaying 20 results from an estimated 31 matches for "rcond".

Did you mean: cond
2012 Feb 27
0
Conflict from saved implicit generics in methods package for rcond, norm, backsolve
This issue ties loosely into other recent S4 topics on this board. The methods package defines a number of implicit generics for linear algebra related functions (rcond, norm, backsolve) that, when used, interfere with base package operations. Here is the cut-and-paste version of the code the illustrates the problem: # rcond x1 <- cbind(1, 1:10) rcond(x1) setGeneric("rcond") rcond(x1) # norm example(norm) setGeneric("norm") example(norm)...
2014 Jun 04
1
Lapack / dgesvx function declaration
...int, i.e. F77_NAME(dgesvx)(const char* fact, const char* trans, const int* n, My reasoning: In the R-source: src/modules/lapack/dlapack.f I find the following lines: * SUBROUTINE DGESVX( FACT, TRANS, N, NRHS, A, LDA, AF, LDAF, IPIV, * EQUED, R, C, B, LDB, X, LDX, RCOND, FERR, BERR, * WORK, IWORK, INFO ) * * .. Scalar Arguments .. * CHARACTER EQUED, FACT, TRANS * INTEGER INFO, LDA, LDAF, LDB, LDX, N, NRHS * DOUBLE PRECISION RCOND where FACT is specified to a char. Might this simply be an err...
2006 Aug 21
5
[LLVMdev] selecting select_cc
...(current program status register). ARM::SELECT would expand to a conditional move (moveq for example). Something similar is done by the Alpha backend: --------------------------------------------------------------------------------------------- def CMOVEQ : OForm4< 0x11, 0x24, "cmoveq $RCOND,$RTRUE,$RDEST", [(set GPRC:$RDEST, (select (seteq GPRC:$RCOND, 0), GPRC:$RTRUE, GPRC:$RFALSE))], s_cmov>; ---------------------------------------------------------------------------------------------- One thing that I don't understand is how the $RFALSE value is used. $...
2017 Feb 09
3
Ancient C /Fortran code linpack error
In my package 'glmmML' I'm using old C code and linpack in the optimizing procedure. Specifically, one part of the code looks like this: F77_CALL(dpoco)(*hessian, &bdim, &bdim, &rcond, work, info); if (*info == 0){ F77_CALL(dpodi)(*hessian, &bdim, &bdim, det, &job); ........ This usually works OK, but with an ill-conditioned data set (from a user of glmmML) it happened that the hessian was all nan. However, dpoco returned *info = 0 (no error...
2006 Sep 07
2
Matrix package in R-2.4.0alpha
...ry, tail, terms, update, vcov, VarCorr, with, cbind2, rbind2, Arith, Math, Math2, Summary, Compare, !, +, %*%, Schur, as.array, as.matrix, as.vector, band, chol, colMeans, colSums, coerce, crossprod, determinant, diag, dim, dimnames, dimnames<-, expand, expm, kronecker, image, isSymmetric, norm, rcond, rowMeans, rowSums, show, solve, t, tcrossprod, tril, triu Error: package/namespace load failed for 'Matrix' > sessionInfo() R version 2.4.0 alpha (2006-09-05 r39134) i386-pc-mingw32 locale: LC_COLLATE=Spanish_Chile.1252;LC_CTYPE=Spanish_Chile.1252;LC_MONETARY=Spanish_Chile.1252;LC_NUME...
2006 Dec 10
1
Problem with loading "library(Matrix)" at Ubuntu
...ib.loc, lib.loc), keep.source = keep.source) : in 'Matrix' methods specified for export, but none defined: Arith, Math, Math2, +, %*%, Schur, as.matrix, chol, colMeans, colSums, coerce, crossprod, determinant, diag, dim, dimnames, dimnames<-, expand, expm, kronecker, image, norm, rcond, rowMeans, rowSums, show, solve, t, tcrossprod Error: package/namespace load failed for 'Matrix' Here is my system: > sessionInfo() R version 2.4.0 (2006-10-03) i486-pc-linux-gnu locale: LC_CTYPE=en_US.UTF-8;LC_NUMERIC=C;LC_TIME=en_US.UTF-8;LC_COLLATE=en_US.UTF-8;LC_MONETARY=en_US.UTF...
2017 Feb 09
3
Ancient C /Fortran code linpack error
...ran Brostr?m <goran.brostrom at umu.se> wrote: > > > > In my package 'glmmML' I'm using old C code and linpack in the optimizing procedure. Specifically, one part of the code looks like this: > > > > F77_CALL(dpoco)(*hessian, &bdim, &bdim, &rcond, work, info); > > if (*info == 0){ > > F77_CALL(dpodi)(*hessian, &bdim, &bdim, det, &job); > > ........ > > > > This usually works OK, but with an ill-conditioned data set (from a user of glmmML) it happened that the hessian was all nan. H...
2017 Feb 10
1
Ancient C /Fortran code linpack error
...trom at umu.se> wrote: >>>> >>>> In my package 'glmmML' I'm using old C code and linpack in the optimizing procedure. Specifically, one part of the code looks like this: >>>> >>>> F77_CALL(dpoco)(*hessian, &bdim, &bdim, &rcond, work, info); >>>> if (*info == 0){ >>>> F77_CALL(dpodi)(*hessian, &bdim, &bdim, det, &job); >>>> ........ >>>> >>>> This usually works OK, but with an ill-conditioned data set (from a user of glmmML) it happened...
2004 Mar 05
1
row-echelon form (was no subject)
I think one needs an LU decomposition rather than QR. However, I couldn't find anything off the shelf to do an LU, other than learning that determinant() now uses LU instead of QR or SVD, so the code to do it must be in there for those that want it. You'll probably need to divide rows of U by the first entry if you insist on the unique reduced REF. However, I can't see any reason
2017 Feb 09
0
Ancient C /Fortran code linpack error
...b 2017, at 16:00, G?ran Brostr?m <goran.brostrom at umu.se> wrote: > > In my package 'glmmML' I'm using old C code and linpack in the optimizing procedure. Specifically, one part of the code looks like this: > > F77_CALL(dpoco)(*hessian, &bdim, &bdim, &rcond, work, info); > if (*info == 0){ > F77_CALL(dpodi)(*hessian, &bdim, &bdim, det, &job); > ........ > > This usually works OK, but with an ill-conditioned data set (from a user of glmmML) it happened that the hessian was all nan. However, dpoco returned *i...
2017 Feb 10
0
Ancient C /Fortran code linpack error
...?m <goran.brostrom at umu.se> wrote: >>> >>> In my package 'glmmML' I'm using old C code and linpack in the optimizing procedure. Specifically, one part of the code looks like this: >>> >>> F77_CALL(dpoco)(*hessian, &bdim, &bdim, &rcond, work, info); >>> if (*info == 0){ >>> F77_CALL(dpodi)(*hessian, &bdim, &bdim, det, &job); >>> ........ >>> >>> This usually works OK, but with an ill-conditioned data set (from a user of glmmML) it happened that the hessian...
2003 Feb 26
1
calculationg condition numbers
am I right in the assumption, that for calculation of the condition numbers I have to use the correlation matrix of X, and not t(x) %*% x? > e <- eigen(t(x) %*% x) better (x must not have a first column of ones): > e <- eigen(cor(x)) > e$val [1] 6.6653e+07 2.0907e+05 1.0536e+05 1.8040e+04 2.4557e+01 2.0151e+00 > sqrt(e$val[1]/e$val) [1] 1.000 17.855 25.153 60.785 1647.478
2008 Nov 10
1
R 2.8. and languageR
...times on different computers but this doesn't help.: Attachement du package : 'Matrix' The following object(s) are masked from package:stats : xtabs The following object(s) are masked from package:base : colMeans, colSums, rcond, rowMeans, rowSums I guess this is the reason why I cannot use the lmer function with this version of R. I would be very grateful if anyone could help on this. Audrey Burki -- Assistante-Doctorante Laboratoire de Psycholinguistique Exp?rimentale FAPSE Universit? de Gen...
2010 Feb 17
2
qr test?
I am testing 'qr' with an admittedly contrived matrix and I am getting different results than I am from another package. The matrix that I am using is: x <- matrix(seq(.1, by=.1, length.out=12), 4) So the whole test is: x <- matrix(seq(.1, by=.1, length.out=12), 4) qr(x) And the output from 'R' is: $qr [,1] [,2] [,3] [1,] -0.5477226 -1.2780193
2008 Mar 28
0
"The Matrix" is approaching version 1.0-0
...ot; (>, <=, ..), "Summary" (sum, max, ...) etc; is.na() Furthermore, 'indexing' : "A[...]" and "A[..] <- value" of all(!) kinds of S/R indexing and some new generic functions such as lu() {LU decomposition} Schur(), BunchKaufman(), norm(), rcond() {Matrix norms and condition numbers} expm() {Matrix exponential}, band(), triu(), tril() {extract band-diagonal or triangular sub-matrices} symmpart(), skewpart() { (x + t(x))/2 and (x - t(x)) / 2 } are provided. Further, an extension to the xtabs function xtabs(*, sparse=TRUE...
2008 Mar 28
0
"The Matrix" is approaching version 1.0-0
...ot; (>, <=, ..), "Summary" (sum, max, ...) etc; is.na() Furthermore, 'indexing' : "A[...]" and "A[..] <- value" of all(!) kinds of S/R indexing and some new generic functions such as lu() {LU decomposition} Schur(), BunchKaufman(), norm(), rcond() {Matrix norms and condition numbers} expm() {Matrix exponential}, band(), triu(), tril() {extract band-diagonal or triangular sub-matrices} symmpart(), skewpart() { (x + t(x))/2 and (x - t(x)) / 2 } are provided. Further, an extension to the xtabs function xtabs(*, sparse=TRUE...
2011 Mar 07
1
a numeric problem
### An numeric problem in R ######## ###I have two matrix one is########## A <- matrix(c(21.97844, 250.1960, 2752.033, 29675.88, 316318.4, 3349550, 35336827, 24.89267, 261.4211, 2691.009, 27796.02, 288738.7, 3011839, 31498784, 21.80384, 232.3765, 2460.495, 25992.77, 274001.6, 2883756, 30318645, 39.85801, 392.2341, 3971.349, 40814.22, 423126.2,
2010 Jan 10
1
lme4 and function 'cholmod_start' not provided by package 'Matrix' / Ubuntu
...2009 i686 GNU/Linux > library(lme4) Loading required package: Matrix Loading required package: lattice Attaching package: 'Matrix' The following object(s) are masked from package:stats : xtabs The following object(s) are masked from package:base : colMeans, colSums, rcond, rowMeans, rowSums Error in dyn.load(file, DLLpath = DLLpath, ...) : function 'cholmod_start' not provided by package 'Matrix' Error: package/namespace load failed for 'lme4' > sessionInfo() R version 2.8.1 (2008-12-22) i486-pc-linux-gnu locale: LC_CTYPE=en_US...
2012 Dec 11
2
Catching errors from solve() with near-singular matrices
Dear all, The background is that I'm trying to fix this bug in the geometry package: https://r-forge.r-project.org/tracker/index.php?func=detail&aid=1993&group_id=1149&atid=4552 Boiled down, the problem is that there exists at least one matrix X for which det(X) != 0 and for which solve(X) fails giving the error "system is computationally singular: reciprocal condition
2008 Aug 25
0
R 2.7.2 is released
...ly warned about invalid code_files names when these were not in the current directory. o shapiro.test(c(0,0,1)) now has P value >= 0 (instead of barely negative). o assign() now warns if given a character vector of length > 1, rather than silently taking the first element. o rcond(<exactly singular matrix>) now gives 0 instead of an error. o There was a memory leak in C function ucstoutf8 used by some graphics devices. o Plots of profile.mle() objects (package 'stats4') were misbehaving when the 'which' argument had been used in their calcu...