search for: lim

Displaying 20 results from an estimated 390 matches for "lim".

Did you mean: lib
2015 May 14
3
comportamiento de data.table al hacer calculos por grupos
...t;,5,1,-33.6,-33.6,1,-34.95,-34.95 "67","dol",5,1,-38,-38,1,-34.95,-34.95 "68","dol",5,1,-32.7,-32.7,1,-34.95,-34.95 "69","dol",5,1,-36,-36,1,-34.95,-34.95 "70","dol",5,1,-34.4,-34.4,1,-34.95,-34.95 "71","lim",1,1,-34.5,-34.5,1,-31.55,-31.55 "72","lim",1,1,-30.8,-30.8,1,-31.55,-31.55 "73","lim",1,1,-33.3,-33.3,1,-31.55,-31.55 "74","lim",1,1,-29.6,-29.6,1,-31.55,-31.55 "75","lim",1,1,-21.8,-21.8,1,-31.55,-31.55 "76&...
2009 Jun 18
1
lattice logaritmic scale (basis "e" ), rewriting labels using xscale.component
...the error message that the location isn't a numeric value. Is there any way to get this working somehow or do I have to take a different approach? Thanks, Katharina Here my failing approach: require(lattice) data(Earthquake, package = "MEMSS") xscale.components.log <- function(lim, ...) { ans <- xscale.components.default(lim = lim, ...) tick.at <- logTicks(paste("e^",lim,sep=""), loc = c(1, 3)) ans$bottom$ticks$at <- log(tick.at, 2) ans$bottom$labels$at <- log(tick.at, 2) ans$bottom$labels$labels <- as.character(tick.at)...
2013 Jul 12
3
Eliminar filas que cumplen con mas de un criterios simultaneamente ...
Estimada comunidad, tengo el siguiente problema: Un data.frame con muchas filas de las que debo eliminar aquellas que cumplen varios criterios al mismo tiempo. Por ejemplo este data.frame: sol con dia NCar NIns isom area rep tipo 1 con 0.001 1 160s 0 s 6.083543e-01 1 2 con 0.001 1 161c 1 c 1.391274e-03 1 <NA> 3 con 0.001 1 161c 1 c 2.812804e-...
2003 Sep 09
1
How limits are set in a scales list
I have a lattice plot that has 4 pages with 4 columns and 8 rows per page. I wish to have the rows use a separate x-axis since their ranges are quite different, but I wish to have those same limits used on each page. By setting an element of the scales list to something like x = list(limits = lim.list$CFU, lim.list$CFU, lim.list$CFU, lim.list$CFU, lim.list$TU, lim.list$TU, lim.list$TU, lim.list$TU, etc, etc) ,...
2013 Jul 12
2
Eliminar filas que cumplen con mas de un criterios simultaneamente ...
Hola de nuevo. Leí mal. Si vas a eliminar esas filas, entonces usa: sqldf("select * from graph where sol!='lim' and dia!=2") En el correo anterior seleccioné precisamente a esas descartando a las demás. Culpa de mis anteojos... jeje. On Fri, Jul 12, 2013 at 5:20 PM, Freddy Omar López Quintero < freddy.vate01@g...
2004 Mar 19
5
asp=1 and aspect ratio
Hi everyone I want a square scatterplot with abline(0,1) going exactly through the SW and NE corners. By "square" I mean that the plotting region is exactly square, and that the axis limits are identical. x <- 1:20 y <- x+rep(c(-1,1),10) lims <- range(c(x,y)) None of the following do this: plot(x,y) ; abline(0,1) #not square plot(x,y,asp=1);abline(0,1) #diagonal line misses corners plot(x,y,asp=1,xaxs="i",yaxs="i");abline(0,1) #diagonal...
2017 Feb 09
3
changes in src/unix/system.c break builds on FreeBSD
...al/include -isystem /usr/local/include -DHAVE_CONFIG_H -fopenmp -fpic -O2 -pipe -DLIBICONV_PLUG -fstack-protector -Wl,-rpath=/usr/local/lib/gcc49 -isystem /usr/local/include -fno-strict-aliasing -c system.c -o system.o system.c: In function 'Rf_initialize_R': system.c:213:13: error: 'RLIM_SAVED_CUR' undeclared (first use in this function) if (lim == RLIM_SAVED_CUR || lim == RLIM_SAVED_MAX) ^ system.c:213:13: note: each undeclared identifier is reported only once for each function it appears in system.c:213:38: error: 'RLIM_SAVED_MAX' undeclared (first use...
2013 Aug 09
1
Agrupar los terminos de la leyenda
Bueno, una pequeña vuelta de tuerca más usando ggplot.. Aunque no quedó tan limpio como el de Carlos (gran resolucion) tambien te sirve. Un saludo library(ggplot2) dec.df <- mat[mat$sol=="dec",] lim.df <- mat[mat$sol=="lim",] dol.df <- mat[mat$sol=="dol",] dec.dr<-qplot(dia,V5,sol,data=dec.df,color=con2,geom=c("line"),fac...
2007 Oct 25
1
Strange behavior with time-series x-axis
I recently called plot(x,y) where x was an array of POSIXct timestamps, and was pleasantly surprised that it produced a nice plot right out of the box: z <- as.POSIXct(c("2006-10-26 08:00:00 EDT","2007-10-25 12:00:00 EDT")) x <- seq(z[1],z[2],len=100) y <- 1:100 plot(x,y,type="l") The X axis had nice labels, one tick mark every other month. (Plotting on
2006 Oct 18
2
Errors with GRED after upgrading to 2.6.18 kernel
ALL: <<diffserv-gred_10-06>> I have attached the current script that I am using. $TC qdisc add dev $EDEV parent 2:20 gred setup DPs 3 default 2 grio $TC qdisc change dev $EDEV parent 2:20 gred DP 1 limit $lim min $minTh max $maxTh avpkt $avgPL burst $bursty bandwidth $netBand probability 0.02 prio 2 $TC qdisc change dev $EDEV parent 2:20 gred DP 2 limit $lim min $minTh max $maxTh avpkt $avgPL burst $bursty bandwidth $netBand probability 0.04 prio 3 $TC qdisc change dev $EDEV parent 2:20 gred DP 3...
2006 May 19
1
trouble with plotrix package
...e rings are scrunched between 80 and 100. It looks like there is an autoscaling feature turned on that says make a fixed number of rings starting at a nice value below the user's lowest data value and extending to a nice value above. There is a switch to set the upper bound on rings (radial.lim) but I don't see a way to specify the lower bound. What I want is a "bullseye" plot that goes from my start value (first ring at 10) to my end value (last ring at 100) independent of the data range. Thanks!! =Randy= R. Zelick email: zelickr at pdx.edu Department of Biology...
2002 Jan 18
3
readline() to vector
Hi! I'm trying to use readline() to ask for xlim() and ylim() values for a subsequent plot. I'm doing: lim <- readline("Enter xlim and ylim values: ") then would like to use the values in lim for a plot: plot(etc, xlim=lim[1:2],ylim=lim[3:4]) The problem is that lim is a character,i.e., "10,20,-10,50" or "c(1...
2008 Aug 01
0
standardize ggplot and lattice themes
...r() > par(cex=1, bty = "n",fg = greyDark, col.lab = "black", > xpd = FALSE, mar = old.par$mar + c(-2,-1,-1,3), mgp=c(1.8, 0.5, 0), > col="black") > > plot(x, y1, new=TRUE, t="n") # plots nothing, needed to find the > dimensions > > lims <- par("usr") > subGrid1 <- axTicks(1) + mean(diff(axTicks(1)))/2 # position of the > grid sub-divisions > subGrid2 <- axTicks(2) + mean(diff(axTicks(2)))/2 > > plot(x, y1, col=1, xlab = "x", ylab = "value", xaxt = "n", yaxt = &g...
2008 Jul 21
0
xyplot: distance between axis and axis-label gets wrong
...ace wich gets used by the labels before it calls the yscale.components function. However, this function can change what is supposed to be plotted and therefore the width can change making previous calculations void. Here is an example: ## ## functions for nice log-axis ## logTicks <- function (lim, loc = c(1, 5), base=10) { ii <-floor(log(range(lim), base)) + c(-1, 2) main <- base^(ii[1]:ii[2]) r <- as.numeric(outer(loc, main, "*")) r[lim[1] <= r & r <= lim[2]] } xyscale.components.log <- function(lim, ..., side=c("bottom"), base=10, majorTi...
2011 Jun 28
1
[LLVMdev] retrieve information from a macro inlined as x86_64 asm in LLVM IR
...ernal runtime system. I insert callbacks to this system in my code to pass the control of the execution. All callbacks are written in inline assembly, in macros. The problem comes when I need to send some information from the runtime system, back to the code. I create one local variable : lim = new AllocaInst(.......); and I want the value of %lim to be set by the runtime system. For this, I want to create a macro that takes as parameter the address of this variable, such that the runtime system can put the value it computes in this address, at runtime. (Similar to sending a parame...
2008 Jun 30
1
Lattice : Single reference line/label at 0.05
...A reference line at y=0.05 as well... This is what I have so far. The label reads 0.0 and there is a grid instead of a single reference line. Can someone help please? Troy x<-18:35 (pv<-1/(x-17)) xydf<-data.frame(x, pv) print(xyplot(pv~x, data=xydf, type=c('p', 'g'), ylim=c(0,1), yscale.components= function(lim, ...) { ans <- yscale.components.default(lim = lim, ...) ans$left$ticks$at <- c(0.05) ans$left$ticks$labels$at <- c(0.05) ans$left$ticks$labels$labels <- c("0.05") ans } )) [[alternative HTML version del...
2013 Jul 12
0
Eliminar filas que cumplen con mas de un criterios simultaneamente ...
Hola, En vez de utilizar "&" (que es "and") utiliza "|" (que es el "or"): graph <- graph[graph$sol=="lim" *|* graph$dia==2,] Saludos, Carlos Ortega www.qualityexcellence.es El 12 de julio de 2013 23:22, Freddy Omar López Quintero < freddy.vate01@gmail.com> escribió: > Hola de nuevo. Leí mal. Si vas a eliminar esas filas, entonces usa: > > sqldf("select * from graph where s...
2013 Nov 16
1
Problema con el titulo de la leyenda en grafico con xyplot
...centration(mM)",space="right",border=F, columns=1,cex=0.8,lines=T,points=F,col=colores) ,scales=list(x=list(relation='same'), y=list(relation='same'), cex=1.2) ,ylab="" ,xlab="" ,ylim=c(-0.2,180) ,abline=list(a=100,b=0) ) lim.df <- mat[mat$sol=="lim",] lim.gr <- xyplot( V5 ~ dia ,groups=con ,data=lim.df ,type="l", pch=1 ,main=list(label="Lim", cex=0.9, x = .2, y = -4.5) ,par.settings=...
2006 Jun 14
1
Estimate region of highest probabilty density
...meter considering also the weight z (to each set of parameters c(v,w,x,y) a weight z is assigned)? Many thanks in advance, I am very grateful for any hint Chris # MASS::kde2d copied and modified # =============================== library(MASS) kde2d.weighted <- function (x, y, w, h, n = n, lims = c(range(x), range(y))) { nx <- length(x) if (length(y) != nx) stop("data vectors must be the same length") gx <- seq(lims[1], lims[2], length = n) # gridpoints x gy <- seq(lims[3], lims[4], length = n) # gridpoints y if (missing(h)) h <- c(bandwidth.nr...
2011 May 12
2
Exporting interactive 3D plots with axes and labels
.... I use the following code to plot a contour of a trivariate normal distribution: library(mvtnorm) library(rgl) library(misc3d) n=25 x=seq(-3,3,length=n) X=cbind(rep(x,each=n**2),rep(rep(x,each=n),n),rep(x,n**2)) p=array(dmvnorm(X,sigma=diag(3)*0.5+0.5),c(n,n,n)) contour3d(p,x,x,x,level=mean(p)) lim=c(-3,3) decorate3d(xlim=lim,ylim=lim,zlim=lim,xlab="Variable X",ylab="Variable Y",zlab="Variable Z") 1. I know thanks to Luke Tierney (www.stat.uiowa.edu/~luke/R/misc3d/misc3d-pdf/misc3d-pdf.pdf) how to export the 3D plot without the axes and labels with: dummy=...