search for: n0

Displaying 20 results from an estimated 161 matches for "n0".

2012 May 20
2
Remus network buffering problem
...1'', ''location'': ''2'', ''online'': ''1'', ''protocol'': ''vt100''} to /local/domain/0/backend/console/2/0. └─(vaerivatnet@xena)─ sudo xenstore-ls -fp ─(Err 1 | 00:50) /local = "" (n0) /local/domain = "" (n0) /local/domain/0 = "" (r0) /local/domain/0/vm = "/vm/00000000-0000-0000-0000-000000000000" (r0) /local/domain/0/device = "" (n0) /local/domain/0/control = "" (n0) /local/domain/0/control/platform-feature-multiproces...
2010 Aug 10
4
Function to Define a Function
...s "one" ## then the output function is exponential growth, if the user choses "two" then ## thhe output function is logistic growth. mdlChooser <- function(type=c("one","two")) { type <- match.arg(type) switch(type, one={ m <- function(x,N0,r) N0*exp(x*r) }, two={ m <- function(x,N0,r,K) (N0*K)/(N0+(K-N0)*exp(-x*r)) }, ) m } ## define time steps t <- 0:10 ## create a function -- junk1 -- that produces exponential growth junk1 <- mdlChooser("one") junk1 res1 <- junk1(t,500,0.2) res1 ## create a function...
2012 Apr 03
3
regression for poisson distributed data
...sform my equation to a generalised equation. Is there an option for nls to choose family = poisson? Lower in the mail the code with the model and visualisations I use to check my results. I also copied the test dataset from my txt file. I am using R 2.15 and Rstudio to visualise it. plot(FR~N0) x <- nls(FR~(exp(i+j*N0)/(1+exp(i+j*N0)))*(k*N0/(k+N0)),start=list(i=0.02,j=0.002,k=6)) summary(x) hatx <- predict(x) lines(spline(N0,hatx)) N0 FR 10 2 10 3 10 2 10 4 10 2 10 2 10 1 10 2 10 2 10 2 20 2 20 3 20 3 20...
2012 Feb 10
4
qemu-xen qdisk performance
...I''m trying to install a Debian PV there, and after more than 3 hours it is still installing the base system. I''ve looked at the xenstore backend entries, and everything looks fine: /local/domain/0/backend/qdisk/21/51712/frontend = "/local/domain/21/device/vbd/51712" (n0,r21) /local/domain/0/backend/qdisk/21/51712/params = "aio:/hdd/vm/servlet/servlet.img" (n0,r21) /local/domain/0/backend/qdisk/21/51712/frontend-id = "21" (n0,r21) /local/domain/0/backend/qdisk/21/51712/online = "1" (n0,r21) /local/domain/0/backend/qdisk/21/51712/...
2006 Jul 03
2
help a newbie with a loop
...ion is working, also with the loop and the graph appears, only when I build another loop around it (for different values of p) , R stays in a loop? Can't it take more then 2 loops in one program? powerb<-function(x,sp2,a,b,b1,m) { sx<-(sum(x^2)-(sum(x)^2)/length(x))/length(x) n0<-ceiling((((qnorm(1-(a/2))+qnorm(1-b))/b1)^2)*(((m+1)/m)*sp2/sx)) repeat { n1<-ceiling((((qt(1-(a/2),n0-4)+qt(1-b,n0-4))/b1)^2)*(((m+1)/m)*sp2/sx)) if(n0==n1) break n0<-n1 } return(c(sx,n1)) } x<-rnorm(1000,0,1) x<-x[order(x)] res<-matrix(0,1000,...
2010 Oct 21
4
data.frame query
Hi All, Apologies for the simplicity of my question, but I would be grateful for any advice. Thanks I'm trying to put the output from a for loop into a data frame, however I have not been successful. The steps I have taken are: *R-code:* >for (k in 1:(nt-1-n0) ){ > n<- n0-1+k > lam=n/nt > Q=x[n] > output1<-data.frame(cbind(k,n,lam,Q)) > output1 > } > output1 *R-Output * k n lam Q 1 14 18 0.9 18 I would like the output in this format, but for all the values of k (i.e. 1-14 as opposed to just the l...
2008 Jan 29
2
Using Predict and GLM
...extensively before sending this email, as it seemed there were several threads on using predict with GLM. However, while my issue is similar to previous posts (cannot get it to predict using new data), none of the suggested fixes are working. The important bits of my code: set.seed(644) n0=200 #number of observations W1=rnorm(n0,mean=2,sd=2) #Use rnorm to generate W1 W2=rnorm(n0,mean=3,sd=8) #Use rnorm to generate W1 Aprob=matrix(.2, nrow=n0, ncol=1) #generating the probability of A #generating probability of A dependant on W1 for(i in 1:n0){ if (W1[i]>1.5) {Aprob[i]=0.4} } A=matr...
2012 Jun 05
1
- help with the predict function
...regression function (functional response model Rogers type II). This is an asymptotic function of which I would like to predict the asymptotic value I estimated the paramters with nls, but can't seem to get predictions for values of m choice...... This is my script: RogersII_N <- nls(FR~N0-lambertW(attackR3_N*Th3_N*N0*exp(-attackR3_N*(24-Th3_N*N0)))/(attackR3_N*Th3_N),start=list(attackR3_N=0.04,Th3_N=1.46),control=list(maxiter=10000)) lista <- c(1,2,100,1000) predict(RogersII_N,newdata=lista) I created a list (lista) with some values of which I would like the predict function to...
2012 Apr 19
1
non-numeric argument in mle2
Hi all, I have some problems with the mle2 function > RogersIIbinom <- function(N0,attackR3_B,Th3_B) {N0-lambertW(attackR3_B*Th3_B*N0*exp(-attackR3_B*(24-Th3_B*N0)))/(attackR3_B*Th3_B)} > RogersII_B <- mle2(FR~dbinom(size=N0,prob=RogersIIbinom(N0,attackR3_B,Th3_B)/N0),start=list(attackR3_B=1.5,Th3_B=0.04),method="Nelder-Mead",data=dat) Error in dbinom(x, size, p...
2019 Mar 13
2
llvm combines "ADD frameindex, constant" to OR
...R by following code without considering about FrameIndex. This haveNoCommonBitsSet says it's safe since FrameIndex(0) is 0. // fold (a+b) -> (a|b) iff a and b share no bits. if ((!LegalOperations || TLI.isOperationLegal(ISD::OR, VT)) && DAG.haveNoCommonBitsSet(N0, N1)) return DAG.getNode(ISD::OR, DL, VT, N0, N1); I checked visitADD more and find that it performs some kind of undo like bellow if the input is (+ (+ FI <const>) <const>). // Undo the add -> or combine to merge constant offsets from a frame index. if (N0....
2008 Oct 29
2
Help using tapply with multiple variables
Dear list, I have the function (as a simple example, which is actually part of a larger function) pres.test<-function(N0=N0, N1=N1) { dt<-5 r<-log(N1/N0)/dt r } which calculates the annual growth rates in a population Where N0 is the population classified into age intervals, say 5 years, at time=1995, and N1 is the population by 5 year age classes at time=2000. For example some data like t...
2002 Aug 07
2
indexing matrices with dimnames?
I've got a covariance matrix that I'd like to index using the dimnames: > vcov1 n0 x0 s n1 n2 n0 82.43824759 1.839505e-02 -4.975196e-01 2.882394e+03 -2.615986e-01 x0 0.01839505 6.134010e-03 -7.695922e-04 -6.373946e+01 6.086321e-03 s -0.49751964 -7.695922e-04 9.638943e-03 3.406594e+02 -3.173671e-02 n1 2882.39407745 -6.3739...
2012 Apr 18
1
error estimating parameters with mle2
Hi all, When I try to estimate the functional response of the Rogers type I equation (for the mle2 you need the package bbmle): > RogersIbinom <- function(N0,attackR2_B,u_B) {attackR2_B+u_B*N0} > RogersI_B <- mle2(FR~dbinom(size=N0,prob=RogersIbinom(N0,attackR2_B,u_B)/N0),start=list(attackR2_B=4.5,u_B=0.16),method="Nelder-Mead",data=data5) I get following error message Error in optim(par = c(4.5, 0.16), fn = function (p) : funct...
2011 Mar 30
2
[PATCH] xenstore-stat v2
The entries in xenstore have permission attributes. The attributes can be easily altered by xenstore-chmod, however, I cannot find a easy way to see them. I''ve modified xenstore_client.c to raise a new utility. The utility checks the permission and makes an easy-look output. Please tell me any suggestions. Thanks. Signed-off-by: Frank Pan <frankpzh@gmail.com> ---
2012 Jul 27
2
[LLVMdev] TLI.getSetCCResultType() and/or MVT broken by design?
...ample is <3 x float>. getSetCCResultType can return any type, and in the AMDIL backends case, for a <3 x float>, returns the corresponding integer version of the vector. The problem comes in code like the following(comments removed): This is from DAGCombiner.cpp:visitSIGN_EXTEND. EVT N0VT = N0.getOperand(0).getValueType(); ... EVT SVT = TLI.getSetCCResultType(N0VT); ... if (VT.getSizeInBits() == SVT.getSizeInBits()) return DAG.getSetCC(N->getDebugLoc(), VT, N0.getOperand(0), N0.getOperand(1), cast<...
2010 Oct 04
2
[LLVMdev] Illegal optimization in LLVM 2.8 during SelectionDAG
...feeling that your back-end is telling instruction selection and the type legalizer that it's okay to replace the normal "and" with this truncate call, which leads to your troubles later on. It would seem that the truncate is created by: TargetLowering::SimplifySetCC ... if (N0.getOpcode() == ISD::SETCC && isTypeLegal(VT) && VT.bitsLE(N0.getValueType())) { bool TrueWhenTrue = (Cond == ISD::SETEQ) ^ (N1C->getAPIntValue() != 1); if (TrueWhenTrue) return DAG.getNode(ISD::TRUNCATE, dl, VT, N0); // Invert th...
2019 Jul 03
3
optimisation issue in an llvm IR pass
Hi Craig, On 03.07.19 17:33, Craig Topper wrote: > Don't the CreateICmp calls return a Value* with an i1 type? But then > they are added to an i8 type? Not sure that works.  I had that initially: auto cf = IRB.CreateICmpULT(Incr, ConstantInt::get(Int8Ty, 1)); auto carry = IRB.CreateZExt(cf, Int8Ty); Incr = IRB.CreateAdd(Incr, carry); it makes no difference to the generated assembly
2011 Jul 27
0
[LLVMdev] Avoiding load narrowing in DAGCombiner
...?  Any idea where to look? The following? // If the LHS is '(and load, const)', the RHS is 0, // the test is for equality or unsigned, and all 1 bits of the const are // in the same partial word, see if we can shorten the load. if (DCI.isBeforeLegalize() && N0.getOpcode() == ISD::AND && C1 == 0 && N0.getNode()->hasOneUse() && isa<LoadSDNode>(N0.getOperand(0)) && N0.getOperand(0).getNode()->hasOneUse() && isa<ConstantSDNode>(N0.getOperand(1))) { LoadSDNode *Lod...
2007 Mar 23
3
distribution graph
I am looking for a way to produce a "distribution graph" as in the example: (http://cecsweb.dartmouth.edu/release1.1/datatools/dgraph.php?year=2003&geotype=STD_HRR&event=A01_DIS&eventtype=UTIL Anybody who can help? Christian von Plessen Department of Pulmonary Medicine Haukeland university hospital Bergen Norway
2012 Jul 27
2
[LLVMdev] TLI.getSetCCResultType() and/or MVT broken by design?
if (N0.getOpcode() == ISD::SETCC && (LegalOperations || (!LegalOperations && VT.isPow2VectorType()))) But the comment right after it is: // sext(setcc) -> sext_in_reg(vsetcc) for vectors. // Only do this before legalize for now. if (VT.isVector() && !Leg...