search for: gr1

Displaying 20 results from an estimated 43 matches for "gr1".

Did you mean: gr
2004 Jun 22
0
[LLVMdev] Linearscan allocator bug?
...r6 is not initialized in the interval from the > function entry till the jump. Okay, I see the problem. You need to tell the compiler that the conditional branches are terminators. You're getting code that looks like this: <LBB7> // // shortcirc_next.0.selectcont.selectcont gr1 = gr1; gr1 = gr1; gr5 = 0; gr2 - gr5; if <>0 goto LBB11; * gr2 = gr4; * gr5 = gr1; * gr6 = gr4; * gr1 = gr1; goto LBB8; I'm guessing that those copies are inserted by the register allocator, and in particular, that is probab...
2004 Jun 22
3
[LLVMdev] Linearscan allocator bug?
...ecessor in at line 285 and the code in shortcirc_next.0.selectcont is (line 268) %gr4 = move %gr2 while I'd expect destination register should be gr6. In fact, gr6 is first used here (line 289): if <>0 goto %disp(label shortcirc_done.1) %gr2 = move %gr4 %gr5 = move %gr1 %gr6 = move %gr4 %gr1 = move %gr1 So, it's possible that jump goes to shortcirc_done.1 which then uses gr6 and gets back results. Any ideas? - Volodya -------------- next part -------------- target endian = little target pointersize = 32 %.str_1 = internal constant [32 x sbyte] c"Bo...
2004 Jun 23
3
[LLVMdev] Linearscan allocator bug?
...interval from the function entry till the jump. > > Okay, I see the problem. You need to tell the compiler that the > conditional branches are terminators. You're getting code that looks like > this: > > <LBB7> // // shortcirc_next.0.selectcont.selectcont > gr1 = gr1; > gr1 = gr1; > gr5 = 0; > gr2 - gr5; > if <>0 goto LBB11; > * gr2 = gr4; > * gr5 = gr1; > * gr6 = gr4; > * gr1 = gr1; > goto LBB8; > > I'm guessing that those copies are inserted by the...
2008 Sep 02
2
two lattice graphs in one object
...pe graph, I typically write a function that returns the graph, as in do.graph <- function(x, y, ...) { require(lattice) return(xyplot(y~x, ...)) } My question today is this: If I want two graphs on one page, one way of achieving it is to print the objects into defined areas, as in gr1 <- xyplot(rnorm(111) ~ runif(111)) gr2 <- xyplot(runif(111) ~ runif(111)) print(gr1, pos=c(0, 0, 1, 0.5), more=T) print(gr2, pos=c(0, 0.5, 1, 1), more=F) Instead of using the print method, can I create a single trellis object that contains those two "sub-graphs"? I do not think so,...
2011 May 19
3
problem with optim()
...i]*log(res1[i]) res3.b[i] = p_tilde[i]*(res2.b[i]) } -(ncol(Y)*sum(res3)+sum(res3.b)) } $B!!(B ##### Gradiants: gr=function(x) { x1 = x[1:ncol(X)] x2 = x[(ncol(X)+1)] x3 = matrix(x[(ncol(X)+2):(ncol(X)+1+ncol(X)*ncol(Y))],nrow=ncol(X),ncol=ncol(Y)) x4 = x[(ncol(X)+1+ncol(X)*ncol(Y)+1):length(x)] gr1 = rep(0,ncol(X)) gr4 = rep(0,ncol(Y)) gr3 = matrix(0,nrow=ncol(X),ncol=ncol(Y)) gr1.b = matrix(0,nrow=nrow(X),ncol=ncol(X)) gr2.b = rep(0,nrow(X)) eta = matrix(0,nrow=nrow(X),ncol=ncol(Y)) d.eta.3 = array(0,dim=c(nrow(X),ncol(X),ncol(Y))) d.eta.4 = matrix(0,nrow=nrow(X),ncol=ncol(Y)) gr3.b1 = array...
2004 Jun 09
0
[LLVMdev] BranchInst problem
On Wed, 9 Jun 2004, Vladimir Prus wrote: > > I assume that the two unconditional gotos are just test code, right? If > > not, the second one is dead. > > Yes, in the final form there will be "iflt" instruction before the first goto, > making it conditional. Ah, ok :) > > > The code after "goto" is disturbing. It looks like spill code, but
2009 Nov 25
0
Possible bug in "unsplit" (PR#14084)
...[3] LC_MONETARY=Norwegian (Bokm?l)_Norway.1252 LC_NUMERIC=C [5] LC_TIME=Norwegian (Bokm?l)_Norway.1252 attached base packages: [1] stats graphics grDevices utils datasets methods base loaded via a namespace (and not attached): [1] tools_2.10.0 > ## a reproducable example: dff <- data.frame(gr1=factor(c(1,1,1,1,1,2,2,2,2,2,2), levels=c(1,2,3,4)), gr2=factor(c(1,2,1,2,1,2,1,2,1,2,3), levels=c(1,2,3,4)), yy=rnorm(11)) # note that the two groups "gr1" and "gr2" have defined levels which not occur in the data. dff2 <- split(dff, list(dff$gr1, dff$gr2), drop=TRUE) #...
2007 Feb 06
1
Questions on counts by case
...arate file, 2. compute the frequency of "1"'s in "x" for each person by group "gr". So, "mike" will have freq=2/3, as he has two "1" and one "0" in 3 groups. Thanks a lot, Serguei Kaniovski The data looks like: person;gr;x mike;gr1;1 jane;gr1;0 bill;gr1;0 jack;gr2;1 mike;gr2;1 jane;gr2;0 bill;gr2;0 alex;gr2;1 james;gr2;1 mike;gr3;0 bill;gr3;1 jane;gr3;1 ___________________________________________________________________ Austrian Institute of Economic Research (WIFO) Name: Serguei Kaniovski P.O.Box 91 Tel.: ...
2004 Jun 09
2
[LLVMdev] BranchInst problem
Chris Lattner wrote: > On Tue, 8 Jun 2004, Vladimir Prus wrote: > > While adding support for branch instructions in my backend, I run into a > > trouble. The code to handle branches looks like: > > The machine code after instruction selection is: > > > > entry (0x8681458): > > %reg1024 = load <fi#-1> > > %reg1025 = load
2004 Nov 16
2
[LLVMdev] Target.td:Register changes
...Target.td: Revamp the Register class, and allow the use of the RegisterGroup class to specify aliases directly in register definitions. and I could not find any discussions in the archives. Why the change was necessary? Writing: def gr0 : Register<"gr0">; def gr1 : Register<"gr1">; def gr2 : Register<"gr2">; def gr3 : Register<"gr3">; def gr4 : Register<"gr4">; is a bit boring and it's very easy to make a mistake. How the names are used? - Volodya
2014 Jul 07
2
a question about optim.R and optim.c in R
Hi, I am learning R by reading R source code. Here is one question I have about the optim function in R. The context : In the optim.R, after all the prep steps, the main function call call is made via : .External2(C_optim, par, fn1, gr1, method, con, lower, upper). So, it seems to me, to follow what is going on from here, that I should read the optim function in \src\library\stats\src\optim.c where it has this signature : SEXP optim(SEXP call, SEXP op, SEXP args, SEXP rho) I am not sure I follow here : In the .External2 call,...
2004 Jun 09
2
[LLVMdev] BranchInst problem
...Code after register allocation # Machine code for _Z3addii(): <fi #-2> is 4 bytes fixed at location [SP-20] <fi #-1> is 4 bytes fixed at location [SP-16] <fi #0> is 4 bytes <fi #1> is 4 bytes <fi #2> is 4 bytes entry (0x8681458): %gr0 = load <fi#-1> %gr1 = load <fi#-2> setcc %gr0, %gr1 store <fi#0>, %gr0 store <fi#1>, %gr1 goto %disp(label then) goto %disp(label else) then (0x8681688): %gr0 = load <fi#1> %gr1 = load <fi#0> %gr0 = + %gr0, %gr1 %gr7 = move %gr0 return else (0x86815e0): %gr0 = load <fi#1&g...
2010 Oct 13
2
How to fix error in the package 'rgenoud'
Dear R user fellows, I would like to ask you about the package 'rgenoud' which is a genetic optimization tool. I ran the function 'genoud' with two variables to be minimized by the following command. result<-genoud(fn,nvars=2,starting.values=c(0.5,0), pop.size=1000, max.generations=10, wait.generations=3) Then, I had the following error message. Error in
2004 Nov 16
0
[LLVMdev] Target.td:Register changes
On Tue, 16 Nov 2004, Vladimir Prus wrote: > and I could not find any discussions in the archives. > > Why the change was necessary? Writing: > > def gr0 : Register<"gr0">; > def gr1 : Register<"gr1">; > def gr2 : Register<"gr2">; > def gr3 : Register<"gr3">; > def gr4 : Register<"gr4">; > > is a bit boring and it's very easy to make a mistake. How the names are used? To be honest, I don...
2012 May 02
1
Hmisc's latex: na.blank and grouping not working as expected
Dear expeRts, Why does na.blank=TRUE not replace the NA's in the following LaTeX table? x <- matrix(1:72, ncol=4, nrow=8) colnames(x) <- c("gr1.sgr1", "gr1.sgr2", "gr2.sgr1", "gr2.sgr2") rn <- apply(expand.grid(beta=c(0.25, 0.75), n=c(100, 500), d=c(10, 100))[, 3:1], 2, rmNames) x <- cbind(rn, x) # append columns containing the row labels x[2,5] <- NA stopifnot(is.na(x[2,5])) require(Hmisc) late...
2004 Jun 23
0
[LLVMdev] Linearscan allocator bug?
...39;tblgen target.td' it will spit out all of the records to stdout so you can visually inspect them. > > Also, if you haven't already, you might want to teach TargetInstrInfo > > that '=' is a move instruction (implement isMoveInstr), so instructinos > > like 'gr1 = gr1' will go away and you'll get coallescing. :) > > BTW, is it possible to set some instruction flag, instead of overriding a > function? Something like: > > let isMove = 1 in > def MOVE :..... That would make sense, but no not currently. :) If you wanted to t...
2004 Jun 08
2
[LLVMdev] BranchInst problem
...goto %disp(label else) then (0x8681688): %reg1026 = + %reg1025, %reg1024 %gr7 = move %reg1026 return .... which looks ok, but after register allocation and prolog/epilogue insertion, I get this: entry (0x8681458): ..... setcc %gr0, %gr1 goto %disp(label then) goto %disp(label else) %ar6 = + %ar6, 1 store %ar6, %gr0 %ar6 = - %ar6, 1 %ar6 = + %ar6, 2 store %ar6, %gr1 %ar6 = - %ar6, 2 The code after "goto" is disturbing. It looks like spill code, but it's...
2020 Oct 28
2
R optim() function
...nction to calculate the bandwidth matrix where this line of code is run: result <- optim(diag(Hstart), scv.mat.temp, method = "Nelder-Mead", control = list(trace = as.numeric(verbose))) Within the optim function, there is a call to an external C function: .External2(C_optim, par, fn1, gr1, method, con, lower, upper) Where Par = (0.339, 0.339), fn1 = function (diagH) { H <- diag(diagH) %*% diag(diagH) if (default.bflag(d = d, n = n)) scvm <- scv.mat(x.star, H, Gs, binned = binned, verbose = FALSE, bin.par = bin.par.star, deriv.order = r) else scvm <- scv.mat(...
2005 Jan 18
0
AMP and Asterisk PSTN extension config
...ore dialing someone exten => s,8,Goto(ext-local,${INCOMING:4},1) exten => s,9,GotoIf($[${intype} = GRP]?10:11) ; If INCOMING starts with GRP, then assume its a ring group exten => s,10,Goto(ext-group,${INCOMING:4},1) exten => s,11,Goto(${INCOMING},s,1) ; not EXT or GR1 - it's an auto attendant exten => fax,1,Goto(ext-fax,in_fax,1) exten => h,1,Hangup [from-pstn-reghours-nofax] exten => s,1,SetVar(intype=${INCOMING}) exten => s,2,Cut(intype=intype,-,1) exten => s,3,GotoIf($[${intype} = EXT]?4:5) ; If INCOMING starts with EXT, then a...
2004 Oct 02
12
[Bug 938] "AllowGroups" option and secondary user's groups limit
...AM support AssignedTo: openssh-bugs at mindrot.org ReportedBy: coil93 at mail.ee Linux Suse 9.1, nss_ldap version 215, pam_ldap version 169, openldap version 2. 2.17 OpenSSH can't handle more than 5 groups via pam_ldap authentication. For example: user john has primary group gr1 and belongs to secondary groups gr2,gr3,gr4,gr5 in LDAP database. sshd_config: AllowGroups 5 UsePAM yes /etc/pam.d/sshd auth required pam_unix2.so # set_secrpc auth required pam_nologin.so auth required pam_env.so account required pam_unix2.so account req...