search for: condvar

Displaying 10 results from an estimated 10 matches for "condvar".

Did you mean: condvars
2013 Jul 04
2
Modificar una función de un paquete
Estimados miembros de la lista. Estoy trabajando con la función mosaic del paquete vcd. Cómo puedo hacer para ver el contenido fe la función y modificar algunos de sus argumentos? Muchas gracias, Manuel -- *Manuel Spínola, Ph.D.* Instituto Internacional en Conservación y Manejo de Vida Silvestre Universidad Nacional Apartado 1350-3000 Heredia COSTA RICA mspinola@una.ac.cr
2013 Jul 04
1
Modificar una función de un paquete
....na(condind)**], > collapse=" / "), "in", deparse(substitute(data)))) > ind <- c(condind, ind) > } > dat <- margin.table(dat, ind) > } > mosaic.default(dat, main = main, sub = sub, highlighting = highlighting, > condvars = if (is.null(condind)) NULL else > match(condnames, names(dimnames(dat))), ...) > } else { > m <- m[c(1, match(c("formula", "data", "subset", "na.action"), > names(m), 0))] > m[[1]] <- as.name("xtabs") > m$f...
2013 Jul 04
0
Modificar una función de un paquete
...find", paste(condnames[is.na(condind)], collapse=" / "), "in", deparse(substitute(data)))) ind <- c(condind, ind) } dat <- margin.table(dat, ind) } mosaic.default(dat, main = main, sub = sub, highlighting = highlighting, condvars = if (is.null(condind)) NULL else match(condnames, names(dimnames(dat))), ...) } else { m <- m[c(1, match(c("formula", "data", "subset", "na.action"), names(m), 0))] m[[1]] <- as.name("xtabs") m$formula <- f...
2011 Jan 20
2
adding text to y-axis per row of panels (lattice)
...be printed in parallel to the y-axis. If this was a base graphic plot, I'd use mtext, but I'm not sure how to get to the same results when using lattice. Here is some example data: library(lattice) varx <- c(1:4,1:4,1:4,1:4) vary <- c(2,2,1.5,0.3,1,2,3,4,-1,-0.5,3,-1,-1,-0.5,1,-3) condvar <- c(1,1,1,1,2,2,2,2,3,3,3,3,4,4,4,4) exampledata <-data.frame(cbind(varx,vary,condvar)) exampledata xyplot(vary~varx|condvar, type="o",data=exampledata, ? ? ? scales=list(alternating=F,x=list(at=c(1,2,3,4)), y=list(at=c(-3,-1,0,1,3))), panel=function(x,y,...){ ?panel.abline(h=-1) ?...
2013 Jul 06
0
Modificar una función de un paquete
...ot; / "), "in", deparse(substitute(data)))) > > ind <- c(condind, ind) > > } > > dat <- margin.table(dat, ind) > > } > > mosaic.default(dat, main = main, sub = sub, highlighting = > highlighting, > > condvars = if (is.null(condind)) NULL else > > match(condnames, names(dimnames(dat))), ...) > > } else { > > m <- m[c(1, match(c("formula", "data", "subset", "na.action"), > > names(m), 0))] > > m[[1]] <- as.name("x...
2014 Mar 14
3
Sys::Virt integration into other event loops
...only examples I can find are the ones included in Sys::Virt source, which consist of a series of run_once() calls, or a while loop around run_default(). Does anyone have any idea how I can make this play nicely with an existing event loop such as EV, or even to fire off ($cv->send) an AnyEvent condvar when the event I set in domain_event_register_any() triggers? Our current solution involves setting an AnyEvent->timer, which periodically fires off and then does a run_once() to see if any events happened during the period, but we’d like something more responsive (i.e., triggers when the event...
2013 Nov 04
1
How to plot results of clmm()?
Dear list, I'd like to create a visual plot of a clmm() I've fitted using the 'ordinal' package in R. It's possible to do this with a glm() by using the 'effects' package. For example: library(effects) data(BEPS) mod <- lm(political.knowledge ~ age + gender + vote, data=BEPS) eff <- effect("age", mod, default.levels=100) plot(eff,
2003 Dec 18
0
[LLVMdev] About clock and wait instruction
...ng with sync operations makes sense). * If the library would impact high-level parallelism mechanisms like MPI, that should be thought about perhaps. * Being able to support languages like Java is important, but I think Java just exposes a subset of pthreads functionality (recursive locks and condvars). * Given native code generator support, it should be implementable on all reasonable targets. * Exposing an abstract-enough layer is important. We want to be able to eliminate extraneous synch operations from programs that don't need it. This, however, means that the meaning of the var...
2014 Mar 14
0
Re: Sys::Virt integration into other event loops
...are the ones included in Sys::Virt source, > which consist of a series of run_once() calls, or a while loop around > run_default(). > > Does anyone have any idea how I can make this play nicely with an existing > event loop such as EV, or even to fire off ($cv->send) an AnyEvent condvar > when the event I set in domain_event_register_any() triggers? > > Our current solution involves setting an AnyEvent->timer, which periodically > fires off and then does a run_once() to see if any events happened during > the period, but we’d like something more responsive (i.e....
2012 Sep 18
8
Collecting entropy from device_attach() times.
Hi. I experimented a bit with collecting entropy from the time it takes for device_attach() to run (in CPU cycles). It seems that those times have enough variation that we can use it for entropy harvesting. It happens even before root is mounted, so pretty early. On the machine I'm testing it, which has minimal kernel plus NIC driver I see 75 device_attach() calls. I'm being very careful