search for: pb

Displaying 20 results from an estimated 819 matches for "pb".

Did you mean: bp
2011 Mar 01
1
Pairwise T-Tests and Dunnett's Test (possibly using multcomp)
...2 120 LO 30  121 LO 27 124 LO 28  125 LO 19 130 LO 23  136 LO 22 137 LO 20  141 LO 19 143 LO 26  148 LO 35 152 LO  .  103 HI 16 105 HI 21  109 HI 31 111 HI 25  113 HI 23 119 HI 25  123 HI 18 127 HI 20  128 HI 18 131 HI 16  135 HI 24 138 HI 22  140 HI 21 142 HI 16  146 HI 33 150 HI 21  151 HI 17 102 PB 22  107 PB 26 108 PB 29  114 PB 19 115 PB  .  117 PB 33 118 PB 37  122 PB 25 126 PB 28  129 PB 26 132 PB  .  133 PB 31 134 PB 27  139 PB 30 144 PB 25  145 PB 22 147 PB 36  149 PB 32 ")   gad <- data.frame(scan(connection,    list(patno=0,dosegrp="",hama=0),na.strings="."...
2016 Mar 15
2
Redundant load in llvm's codegen compares to gcc when accessing escaped pointer?
Hi, Please look at this c code: typedef struct _PB { void* data; /* required.*/ int f1_; float f2_; } PB; PB** bar(PB** t); void qux(PB* c) { bar(&c); /* c is escaped because of bar */ c->f1_ = 0; c->f2_ = 0.f; } // gcc-5.2.1 with -fno-strict-aliasing -O2 on x86 call bar movq 8(%rsp), %rax movl $0,...
2016 Mar 18
3
Redundant load in llvm's codegen compares to gcc when accessing escaped pointer?
On 2016.03.17 at 16:35 -0700, Chris Lattner via llvm-dev wrote: > > > On Mar 15, 2016, at 7:58 AM, Chuang-Yu Cheng via llvm-dev <llvm-dev at lists.llvm.org> wrote: > > > > Hi, > > > > Please look at this c code: > > > > typedef struct _PB { > > void* data; /* required.*/ > > int f1_; > > float f2_; > > } PB; > > > > PB** bar(PB** t); > > > > void qux(PB* c) { > > bar(&c); /* c is escaped because of bar */ > > c->f1_ = 0; > > c->...
2016 Mar 18
4
Redundant load in llvm's codegen compares to gcc when accessing escaped pointer?
...the end of its lifetime." 2. We are trying to preserve 1st load and remove other loads now, because our test pattern can not get rid of "-fno-strict-aliasing", and additional loads hurt performance. We did some change in SROA::runOnAlloca, we try to do something like this: void qux(PB* _c) { PB* c; <= insert this for original code bar(&_c); c = _c; <= insert this for original code c->f1_ = 0; c->f2_ = 0.f; } Any opinions please let us know. Thanks! CY On Fri, Mar 18, 2016 at 11:24 PM, David Blaikie <dblaikie at gmail.com> wrote:...
2008 May 08
2
anova p value extraction
hello all, Quick question, how do I get the p value out of the anova? Thanks, Paul > pb<-aov(as.numeric(diff[5,16:33]) ~ grF) > summary(pb) Df Sum Sq Mean Sq F value Pr(>F) grF 3 2.7860e+10 9.2867e+09 4.2236 0.02534 * Residuals 14 3.0783e+10 2.1988e+09 --- Signif. codes: 0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1...
2008 May 09
1
getWinProgressBar does not return previous value
I am trying to use winProgressBar, however I find that although setWinProgressBar updates the value on the screen, getWinProgressBar does not return this value. E.g > pb <- winProgressBar() > setWinProgressBar(pb, 0.2) > getWinProgressBar(pb) [1] 0 I tried the same with tkProgressBar, and it is working as I would expect from the documentation. > pb <- tkProgressBar() > setTkProgressBar(pb, 0.5) > getTkProgressBar(pb) [1] 0.5 ... and I get the...
2011 Nov 28
1
code problem with the optim() function
...th(levels(r2)),lev <- c(levels(r1), levels(r2)), lev <- c(levels(r2), levels(r1))) lev <- lev[!duplicated(lev)] r1 <- factor(ratings[, 1], levels = lev) r2 <- factor(ratings[, 2], levels = lev) ttab <- table(r1, r2) total<-margin.table(ttab) pa<-(margin.table(ttab,1)/total) pb<-(margin.table(ttab,2)/total) ncate<-length(levels(as.factor(as.matrix(ratings)))) pp<-prop.table(ttab) sumagr<-sum(diag(ttab))/ns alpha<-(sumagr-sum(pa*pb))/(1-sum(pa*pb)) aickin <- function(theta,ratings) { alphanew<-theta[1] pah<-theta[2:3] pbh<-theta[4:5] ratings...
2011 Sep 30
2
isotope superscripts ggplot2
.... Normally, the isotope mass number appears as a superscript before the chemical symbol. However, I cannot figure out how to do this ggplot2's axis labels. The closest I have come is using "." In front of the numbers I am superscripting e.g: ggplot(.... +xlab(expression(.^207*"Pb/"*.^206*"Pb"))+ylab(expression(.^208*"Pb/"*.^206*"Pb") I have searched for this and have not had any luck so far... any suggestions? VR Jim James T. Durant, MSPH, CIH Emergency Response Coordinator DIvision of Toxicology and Environmental Medicine US Agency fo...
2010 Apr 08
2
[LLVMdev] Check the location of the definition of a Value object
...--- entry: ... %2 = call i32 (...)* @atoi(i8*%1) nounwind ... -- bb1: .. %5 = icmp sgt i32 %2, %i.0 ... ----------------- Here I got the corresponding pointer of the Value object of *%2*. How can I check whether it is defined in *entry* or not? I tried: --------------------- //Value* pb corresponding to %2 for (BasicBlock::iterator I=entry->begin(), e=entry.end(); I != e; I++) { if (I == pb) return true; } return false; ---------------------- However, I got errors when compiled the code. Could anyone give some simple examples about this issue? Thanks. Cheer...
2012 Nov 30
4
qbinom
a=c(0.1, 0.2, 0.3, 0.4, 0.5, 0.6, 0.7, 0.8, 0.9) b=c(0.9, 0.8, 0.7, 0.6, 0.5, 0.4, 0.3, 0.2, 0.1) cor(a,b)= -1 a'=qbinom(a, 1, 0.5) b'=qbinom(b, 1, 0.5) why cor(a',b') becomes -0.5 ? -- View this message in context: http://r.789695.n4.nabble.com/qbinom-tp4651460.html Sent from the R help mailing list archive at Nabble.com.
2009 Dec 04
3
[PATCH] nouveau: avoid running out of relocs
...uveau_stateobj.h index b595405..28f483f 100644 --- a/src/gallium/drivers/nouveau/nouveau_stateobj.h +++ b/src/gallium/drivers/nouveau/nouveau_stateobj.h @@ -113,8 +113,10 @@ so_emit(struct nouveau_channel *chan, struct nouveau_stateobj *so) unsigned nr, i; nr = so->cur - so->push; - if (pb->remaining < nr) - nouveau_pushbuf_flush(chan, nr); + /* This will flush if we need space. + * We don't actually need the marker. + */ + nouveau_pushbuf_marker_emit(chan, nr, so->cur_reloc); pb->remaining -= nr; memcpy(pb->cur, so->push, nr * 4); @@ -138,8 +140,10 @@...
2010 Apr 08
0
[LLVMdev] Check the location of the definition of a Value object
Zheng Wang wrote: > Hello, > > How to check whether a value object is within a particular basic block or not. > There is a much simpler way to do this. Assuming that Value * pb holds the pointer to the value of %2, you do the following: 1) Check to see if %2 is an instruction (use dyn_cast<Instruction>(pb) and see if the result is NULL). If it's not an instruction, then it's definitely not defined in the entry block. 2) Use the result of dyn_cast<In...
2004 Oct 17
3
how to draw a multivariate function
Hi, Rusers: Thanks for answering my last questions. I am frustrated in plotting a trinomial pmf function f(x,y | n, pa, pb) = factorial(n)/ (factorial(x) * factorial(y) * factorial (n-x-y))* pa^x * pb^y * ((1-pa-pb)^(n-x-y)) obviously it is a bivariate function of x and y. But I have put a lot of time on this. ********************************** x <- seq(0, n, len = n/2+1) # for now I set it to n/2 to control x+y &...
2005 Feb 17
1
Fix a bug that causes the encoder to spend way to many bits on keyframes
...c->fps_denominator ) / 8; + c->fps_denominator / + c->fps_numerator ) / 8; /* Note the height and width in the pre-processor control structure. */ cpi->ScanConfig.VideoFrameHeight = cpi->pb.info.height; I'm also playing around with the following change to help remove the "popping" artifact that I mentioned above. This change removes the restriction that keyframe Q must be in the range 20 <= Q <= 50. For encodes that tend to use Q lower than 20 you see the "...
2006 May 02
6
Stopping the Ajax.PeriodicalUpdater -- My Kludge?
...per? :) --------- Summary: A PeriodicUpdater calls a server script which returns the percent finished of a process as a JSON encoded string in a x-json header. When the percent is > 10, I''d like to STOP the periodicupdater from making any further AJAX calls. The problem: If I issue pb.stop() in the onSuccess function [pbCheck()], nothing happens. The script continues! The workaround: Set percent value using pbCheck, Use setTimeout to continually poll pbKill() which checks the percent value & if it''s greater than 10, issues STOP to updater before destroying it (...
2010 Apr 09
6
function rep
Hi, I've got the following code: p <- 0.34 pb <- p*100 pr <- (1-p)*100 A <- rep(0,pb) # a vector with 34 "zeros" B <- rep(1,pr) # a vector with 66 "ones" Now if I type length(A), R answer correctly 34 but if I type length(B), R answer 65 instead of 66. I don't understand why it happens. Can anyone hel...
2011 Sep 30
1
need help on forest plot with ggplot
...r R users, I am trying to do the forest plot follow the function given on web. However, the order of the tests has been sorted alphabetically. I would prefer keeping the order as data frame input so that I can group and compare (from the graph) the target immune NS1, IgG and IgM (where SD, BioRad, Pb etc are the brand names) > d x y ylo yhi SD.NS1 SD.NS1 43.23250 38.25736 48.20764 BioRad.NS1 BioRad.NS1 57.31750 54.28494 60.35006 Pb.NS1 Pb.NS1 56.21563 53.14092 59.29033 SD.IgG SD.IgG 62.26750 60.65677 63.87823 Iq.IgG...
2013 Jun 19
2
Barra de progreso
...;R-help-es@r-project.org" <R-help-es@r-project.org> Enviado: Martes 18 de junio de 2013 19:20 Asunto: Re: [R-es] Barra de progreso # Fuente: http://ryouready.wordpress.com/2009/03/16/r-monitor-function-progress-with-a-progress-bar/ library(utils) total <- 20 # create progress bar pb <- txtProgressBar(min = 0, max = total, style = 3) for(i in 1:total){    Sys.sleep(0.1)    # update progress bar    setTxtProgressBar(pb, i) } close(pb) library(tcltk) total <- 20 # create progress bar pb <- tkProgressBar(title = "progress bar", min = 0,                     max...
2010 Apr 08
4
[LLVMdev] How to Load a Value?
Hello, I have a problem of generating a load instruction. The LLVM bytecode is: ------------------------ entry: ... %2 = call i32 (...)* @atoi(i8*%1) nounwind /*<- Insertpos*/ ... -- bb1: .. %5 = icmp sgt i32 %2, %i.0 ... ----------------- Now I have pb: pointer to the Value object of *%2* of bb1. Here, I want to generate a load instruction and I did it as: new LoadInst(pb, "load_2", InsertPos); where InsertPos points to the position immediately after "%2 = call i32 (...)* @atoi(i8*%1) nounwind". BUT I got a runtime error...
2009 Dec 13
3
[PATCH] nouveau: avoid running out of relocs (attempt 5)
...rc/gallium/drivers/nouveau/nouveau_stateobj.h index 62990f9..de045ef 100644 --- a/src/gallium/drivers/nouveau/nouveau_stateobj.h +++ b/src/gallium/drivers/nouveau/nouveau_stateobj.h @@ -112,19 +112,29 @@ so_emit(struct nouveau_channel *chan, struct nouveau_stateobj *so) { struct nouveau_pushbuf *pb = chan->pushbuf; unsigned nr, i; + int ret = 0; nr = so->cur - so->push; - if (pb->remaining < nr) - nouveau_pushbuf_flush(chan, nr); + /* This will flush if we need space. + * We don't actually need the marker. + */ + if ((ret = nouveau_pushbuf_marker_emit(chan, nr, so-...