Displaying 12 results from an estimated 12 matches for "bdiag".
Did you mean:
diag
2017 Nov 20
2
package check fail on Windows-release only?
...ut not found
Error in namespaceExport(ns, exports) :
undefined exports: %&%, Cholesky, .SuiteSparse_version, Diagonal,
.symDiagonal, .sparseDiagonal, .trDiagonal, Hilbert, KhatriRao,
Matrix, MatrixClass, spMatrix, sparseMatrix, rsparsematrix, Schur,
abIseq, abIseq1, rep2abI, band, bandSparse, bdiag, .bdiag,
c.sparseVector, condest, onenormest, .asmatrix, .dsy2mat, .dsy2dsp,
.dxC2mat, .T2Cmat, ..2dge, .dense2sy, .C2nC, .nC2d, .nC2l, .diag.dsC,
.solve.dgC.chol, .solve.dgC.qr, .solve.dgC.lu, diagN2U, diagU2N,
.diagU2N, .diag2tT, .diag2sT, .diag2mat, drop0, expand, expm, facmul,
fac2sparse, fac2S...
2009 Mar 11
1
matrix multiplication, tensor product, block-diagonal and fast computation
...and as.matrix)
Adf0 <- apply(A, 3, as.data.frame)
Adf1 <- lapply(X=Adf0, FUN=as.matrix, nrow=4, ncol=4)
M3 <- mapply(FUN="%*%", Adf1, as.data.frame(M))
# fourth solution (often too large block-diagonal matrix)
Alist <- NULL
for(i in 1:3){ # better way to create such list for bdiag
Alist[[i]] <- A[,,i]
}
Abd <- bdiag(Alist)
M4 <- matrix(as.matrix(Abd %*% c(M)), nrow=4, ncol=3)
----------
This mail has been sent through the MPI for Demographic ...{{dropped:10}}
2005 Jan 28
2
Direct sum of matrices
Hi R users:
How can I built a direct sum function of matrices in R?
I mean A(mxn), B(pxq), C(rxs),...
X<-ds(A,B,C,...)
X = [ A, 0, 0
0, B, 0
0, 0, C] ((m+p+r+...) x (n+q+s+...))
Thank you for your help.
Kenneth
--
Using Opera's revolutionary e-mail client: http://www.opera.com/m2/
2006 Sep 21
1
How to generating diagnal blocks ?
Hi,
I am trying to creat a matrix with diagnal blocks, say, I have a matrix X of any dimension (nxm) ,and would like to have:
X
X
X
2017 Nov 21
0
package check fail on Windows-release only?
...ort(ns, exports) :
> undefined exports: %&%, Cholesky, .SuiteSparse_version, Diagonal,
> .symDiagonal, .sparseDiagonal, .trDiagonal, Hilbert, KhatriRao,
> Matrix, MatrixClass, spMatrix, sparseMatrix, rsparsematrix, Schur,
> abIseq, abIseq1, rep2abI, band, bandSparse, bdiag, .bdiag,
> c.sparseVector, condest, onenormest, .asmatrix, .dsy2mat, .dsy2dsp,
> .dxC2mat, .T2Cmat, ..2dge, .dense2sy, .C2nC, .nC2d, .nC2l, .diag.dsC,
> .solve.dgC.chol, .solve.dgC.qr, .solve.dgC.lu, diagN2U, diagU2N,
> .diagU2N, .diag2tT, .diag2sT, .diag2mat, drop0, exp...
2004 May 27
2
block diagonal matrix function
Hello List
I have just written a little function that takes two matrices as
arguments and returns a large matrix that is composed of the two input
matrices in upper-left position and lower-right position with a padding
value everywhere else. (function definition and toy example below). I
need nonsquare matrices and rowname() and colname() inherited appropriately.
Two questions:
(1) Is there a
2011 Apr 21
2
combining matrices
Heja,
I hope someone is still there to help me:
How can I somehow merge/combine matrices to get such a result:
Matrix A
A B
x1 1 0
x2 1 1
Matrix B
C D
x3 1 0
x4 0 1
Resulting Matrix?
A B C D
x1 1 0 0 0
x2 1 1 0 0
x3 0 0 1 0
x4 0 0 0 1
Does anyone see this probably obvious solution with R how to do this?
Sorry if this question is silly...it's too hot here to think properly ;O)
2005 Sep 01
1
More block diagonal matrix construction code
...y Liaw recently submitted some code to construct a
block diagonal matrix. For what seemed a fairly straightforward task, the
code seemed a little "overweight" to me (that's an American stock analyst's
term, btw), so I came up with a slightly cleaner version (with help from
Andy):
bdiag<-function(...){
mlist<-list(...)
## handle case in which list of matrices is given
if(length(mlist)==1)mlist<-unlist(mlist,rec=FALSE)
csdim<-rbind(c(0,0),apply(sapply(mlist,dim),1,cumsum ))
ret<-array(0,dim=csdim[length(mlist)+1,])
add1<-matrix(rep(1:0,2),nc=2)
for(i in seq...
2007 Oct 23
1
create diagonal matrix within a for cycle
? stato filtrato un testo allegato il cui set di caratteri non era
indicato...
Nome: non disponibile
Url: https://stat.ethz.ch/pipermail/r-help/attachments/20071023/b860b22b/attachment.pl
2008 Mar 28
0
"The Matrix" is approaching version 1.0-0
...contingency tables
and coercion of one *factor* (possibly crossed with one <numeric>)
to the corresponding (potentially huge) sparse model matrix for sparse
least squares and related computations.
Further to the above, "Matrix" objects are also constructed by
Matrix(), spMatrix(), bdiag() {block-diagonal}, Diagonal() and many
as(., "....Matrix") possibilities.
The Matrix package also provides a C level API (header files of
exported C functions providing low-level functionality) to many of its
internal algorithms that other packages can link to. Currently, the
'lme4...
2008 Mar 28
0
"The Matrix" is approaching version 1.0-0
...contingency tables
and coercion of one *factor* (possibly crossed with one <numeric>)
to the corresponding (potentially huge) sparse model matrix for sparse
least squares and related computations.
Further to the above, "Matrix" objects are also constructed by
Matrix(), spMatrix(), bdiag() {block-diagonal}, Diagonal() and many
as(., "....Matrix") possibilities.
The Matrix package also provides a C level API (header files of
exported C functions providing low-level functionality) to many of its
internal algorithms that other packages can link to. Currently, the
'lme4...
2010 Jan 10
1
lme4 and function 'cholmod_start' not provided by package 'Matrix' / Ubuntu
...taNote: no longer available, since we use data/*.R *and*
our classes
....
all.equal-methods Matrix Methods for Function all.equal()
atomicVector-class Virtual Class "atomicVector" of Atomic Vectors
band Extract bands of a matrix
bdiag Construct a Block Diagonal Matrix
cBind Versions of 'cbind' and 'rbind' recursively
built on cbind2/rbind2
chol Choleski Decomposition - 'Matrix' S4 Generic
colSums Form Row and C...