search for: nstep

Displaying 14 results from an estimated 14 matches for "nstep".

Did you mean: step
2023 Jun 28
1
horizontal grouped stacked plots and removing space between bars
...panel.background = element_blank(), axis.title.x = element_blank(), axis.text.x=element_blank(), axis.ticks.x=element_blank(), axis.title.y = element_text(angle = 90, hjust = 0.5)) And my data is this: > dput(data) structure(list(specie = c("gmx mdrun -gpu_id 1 -ntomp 16 -s benchMEM.tpr -nsteps 10000", "gmx mdrun -gpu_id 1 -ntomp 16 -s benchMEM.tpr -nsteps 10000", "gmx mdrun -gpu_id 1 -ntomp 16 -s benchMEM.tpr -nsteps 10000", "gmx mdrun -gpu_id 1 -ntomp 16 -s benchMEM.tpr -nsteps 10000", "gmx mdrun -gpu_id 1 -ntomp 16 -s MD_15NM_WATER.tpr -nsteps 1...
2023 Jun 16
1
Issue with crammed Y axis
Hi, I have a data frame like this: > dput(df) structure(list(ID = 1:8, Type = c("gmx mdrun -ntmpi 8 -ntomp 1 -s benchPEP.tpr -nsteps 10000 -resethway", "gmx mdrun -ntmpi 8 -ntomp 1 -s benchPEP.tpr -nsteps 10000 -resethway", "gmx mdrun -ntmpi 8 -s benchPEP.tpr -nsteps 4000 -resetstep 3000", "gmx mdrun -ntmpi 8 -s benchPEP.tpr -nsteps 4000 -resetstep 3000", "gmx mdrun -ntmpi 8 -s benchPEP.t...
2007 Nov 22
2
manual parallel processing
...rkspace on the fly (I mean put some command, before the loop that call genoud(), to export the workspace in its actual state to other computers) 2) divide the task in the number of available computers in the network;e.g, if I've got my "localhost" and 3 computers more: n.comp <- 4 nsteps <- 1987 steps.c <- trunc(nsteps/n.comp) steps.c <- (1:n.comp)*steps.c steps.c <- c(steps.c[1:(n.comp-1)],nsteps) steps.i <- c(1,steps.c[-n.comp]+1) for(ic in 1:n.comp){ Somehow start remotely R, read the copied workspace and execute in computer ic for(i in steps.i[ic]:steps.c[ic]...
2009 Mar 21
2
limiting simulated animal movement
Hi, I am trying to simulate animal movement in a gridded landscape made up of cells. At each time step (iteration), the animal moves from one cell to another in a random fashion. This is how I am simulating movement, where a and b are the x,y co-ordinates of the animal at the previous time step: for (i in 1:no.of.steps){ direction <- sample(1:8, 1) if(direction == 1){ a <- a b <- b -
2006 Apr 04
0
Need help debugging (long)
...ot;, file=0xb7dc7f11 "gconv_db.c", line=232, function=0xb7dc7f36 "__gconv_release_step") at assert.c:78 #4 0xb7cd4054 in __gconv_release_step (step=<value optimized out>) at gconv_db.c:232 #5 0xb7cd40eb in __gconv_close_transform (steps=0x8401f30, nsteps=2) at gconv_db.c:791 #6 0xb7cd3dbe in __gconv_close (cd=0x8412a50) at gconv_close.c:64 #7 0xb7cd338c in iconv_close (cd=0x0) at iconv_close.c:36 #8 0x0829106d in smb_iconv_close (cd=0x8412a28) at lib/iconv.c:315 #9 0x08265ca0 in charset_name (ch=CH_DISPLAY) at lib/charcnv.c:82 #10 0x08...
2004 May 17
1
drawing half-circles
Dear wonderful R community, I've been creating color-coded concentric circles using the "points" function, but I just realized that what I would really like to do is draw color-coded concentric half-circles. (Because I want to communicate information about the diameters-- half-circles are sufficient to show diameters AND they leave ample room to one side of the figure to label
2005 Dec 04
1
Understanding nonlinear optimization and Rosenbrock's banana valley function?
...gradient=df, hessian=d2f, code=2, iterations=i)) } # Next iter f0 <- f.i f.i <- f(p+dp) # Step size control if(f.i>=f0){ for(j in 1:iterlim){ { if(j==1){ d2f.eig <- eigen(d2f, symmetric=T) cat("\nstep size control; i=", i, "; p=", round(p, 3), "; dp=", signif(dp, 2), "; eig(hessian)=",signif(d2f.eig$values, 4)) v.max <- (1+max(abs(d2f.eig$values))) v.adj <- pmax(.001*v.max, abs(d2f.eig$values))...
2008 Jun 05
0
error message from Tps function
Hello list-mailers, I'm trying to use the 'Tps' function from the 'fields' package and I can getting this error message: > fishplot <- Tps(nodes.catch, res2) Error in if ((il > 1) & (il < nstep.cv)) { : missing value where TRUE/FALSE needed In addition: Warning message: no non-missing arguments to min; returning Inf nodes.catch is a 1600x2 matrix and res2 is a 1600 long vector. They both contain zeros but no missing values or NA. I really appreciate your help. Thanks, Tania [[a...
2011 Feb 04
0
MSBVAR and hc.forecast
...t;-ts(cbind(a,b),start=c(1.1,1.1), names=c("a","b")) fit.bvar <- szbvar(K, p = 1, lambda0=0.6, lambda=0.1, lambda3=2, lambda4=0.25,lambda5=0,mu5=0, mu6=0, prior=0) y <- matrix(c(rep(0,8),c(1.10,1.10,1.10,100.1,1.10,1.10,1.0,100.10)),ncol=2) h <- hc.forecast(fit.bvar,y,nsteps=8,burnin=300, gibbs=500,exog=NULL)
2007 May 15
0
step in Sweave
Dear peRsons, I have a Sweave document which demonstrates the usage of step() function. With current R version 2.5.0 the step() function was changed so that the heading of trace=TRUE output for each model is printed using command message(): if (trace) message("\nStep: AIC=", format(round(bAIC, 2)), "\n", cut.string(deparse(as.vector(formula(fit)))), "\n") And the actual models concerned with true blue print(): if (trace) print(aod[o, ]) The problem here is that these par...
2011 Jul 26
0
Extensión de propiedades de una función
...Diego Anexo la programación de interes ".fecov" <- function(x, n.ahead) { n.par<-sapply(x$varresult, function(x) summary(x)$df[2]) sigma.u <- crossprod(resid(x))/n.par Sigma.yh <- array(NA, dim = c(x$K, x$K, n.ahead)) Sigma.yh[, , 1] <- sigma.u Phi <- Phi(x, nstep = n.ahead) if (n.ahead > 1) { for (i in 2:n.ahead) { temp <- matrix(0, nrow = x$K, ncol = x$K) for (j in 2:i) { temp <- temp + Phi[, , j] %*% sigma.u %*% t(Phi[, , j]) } Sigma.yh[, , i] <- temp + Sigma.yh[, , 1] } } return(Sigma.yh) }
2010 Jun 26
4
optim() not finding optimal values
I am trying to use optim() to minimize a sum-of-squared deviations function based upon four parameters. The basic function is defined as ... SPsse <- function(par,B,CPE,SSE.only=TRUE) { n <- length(B) # get number of years of data B0 <- par["B0"] # isolate B0 parameter K <- par["K"]
2009 May 05
0
stepAICc function (based on MASS:::stepAIC.default)
...stop("number of rows in use has changed: remove missing values?") Terms <- terms(fit) bAIC <- extractAIC(fit, scale, k = k, ...) edf <- bAIC[1L] bAIC <- bAIC[2L]+((2*edf*(edf+1))/(nnew-edf-1)) if (trace) { cat("\nStep: AICc=", format(round(bAIC, 2)), "\n", cut.string(deparse(as.vector(formula(fit)))), "\n\n", sep = "") utils::flush.console() } if (bAIC >= AICc + 1e-07) break nm <- nm + 1...
2007 Nov 23
0
R users in Cyprus
...rkspace on the fly (I mean put some command, before the loop that call genoud(), to export the workspace in its actual state to other computers) 2) divide the task in the number of available computers in the network;e.g, if I've got my "localhost" and 3 computers more: n.comp <- 4 nsteps <- 1987 steps.c <- trunc(nsteps/n.comp) steps.c <- (1:n.comp)*steps.c steps.c <- c(steps.c[1:(n.comp-1)],nsteps) steps.i <- c(1,steps.c[-n.comp]+1) for(ic in 1:n.comp){ Somehow start remotely R, read the copied workspace and execute in computer ic for(i in steps.i[ic]:steps.c[ic])...