Displaying 3 results from an estimated 3 matches for "vecp".
Did you mean:
vec
2007 Jan 31
0
Interactive plots with R
...I need to study samples and documentation for tcltk package?
My script:
DATAPPM=seq(0,11,0.004)
DATAPPM=data.frame(DATAPPM,DATAPPM,DATAPPM)
DATAS=data.frame
(S1=sample(1:3260,2751),S2=sample(1:3260,2751),S3=sample(1:3260,2751))
library (rpanel)
pplotNMR <- function (panel) {
with (panel,{
VECP <- DATAPPM[,sample]
VECS <- DATAS[,sample]
names (VECP) <- rownames(DATAPPM)
names (VECS) <- rownames(DATAS)
SEL <- names(VECP[VECP>MIN & VECP<MAX])
VECP <- VECP[SEL]
VECS <- VECS[SEL]
plot (VECP,VECS,type="l",xlim=c(MAX,MIN),xlab="PPM",yla...
2001 Nov 05
1
Problem to transfer Splus functions
...-------------------------------------------------------
nf <- length(res$values)
cond <- res$values < tol * sum(res$values)
nfmax <- if(sum(cond) > 0) min((1:length(res$values))[cond]) -
1 else nf
res$values <- res$values[1:nfmax]
res$vectors <- res$vectors[, 1:nfmax]
vecp <- res$vectors
# Reorientation des deux premiers vecteurs propres pour avoir un max
# de saturations positives
v12 <- rep(1, ncol(x)) %*% (vecp[, 1:2]/abs(vecp[, 1:2]))
v12 <- 2 * (as.numeric(v12 >= 0) - 0.5)
vecp[, 1:2] <- t(v12 * t(vecp[, 1:2]))
# calcul des vecteur...
2007 Jan 05
1
help for memory problem with 64-bit machines
...teger(inc),
as.integer(nsol), as.integer(niter), as.logical(improvement),
as.double(cooling), as.double(temp), as.integer(coolfreq),
as.integer(length(pcindices)), as.integer(pcindices), as.logical(esp),
as.logical(silog), as.integer(as.vector(initialsol)), as.double(valp),
as.double(as.vector(vecp)), as.double(as.vector(H)), as.integer(r), PACKAGE =
"subselect")
2: anneal(cor(swiss), 2, 3, nsol = 4, niter = 10, criterion = "RM")
aborting ...
-------------------------------------------------------------------------------
-----
------- user's tests output...