search for: tck

Displaying 20 results from an estimated 212 matches for "tck".

Did you mean: ack
2000 Jul 12
1
plot.times error -- missing or illegal tck parameter (PR#601)
There seems no default setting for tck, causing problems for plot.times() > library(chron) > dts <- dates(c("02/27/92", "02/27/92", "01/14/92", + "02/28/92", "02/01/92")) > y<-chron(dts,out.format=c("dmy","h:m:s")) > y [1] 270292 2702...
2018 Feb 06
2
Re: [libvirt] [PATCH tck] Relabel SELinux when customizing virt-builder image
...o install extra RPMs, this potentially >> looses the SELinux labelling that Anaconda had originally setup. Thus we >> must tell virt-builder to enable SELinux relabelling. >> >> Signed-off-by: Daniel P. Berrangé <berrange@redhat.com> >> --- >> lib/Sys/Virt/TCK.pm | 2 +- >> 1 file changed, 1 insertion(+), 1 deletion(-) >> >> diff --git a/lib/Sys/Virt/TCK.pm b/lib/Sys/Virt/TCK.pm >> index e9da8d2..b39f578 100644 >> --- a/lib/Sys/Virt/TCK.pm >> +++ b/lib/Sys/Virt/TCK.pm >> @@ -405,7 +405,7 @@ sub create_virt_builde...
2010 May 26
1
persp(); help with 'tck' option
Hi All, I'm using 'tck' option to *reduce* the length of tick marks but it is not working, can anyone please tell me where I'm going wrong... require(graphics) require(grDevices) x <- seq(-10, 10, length= 30) y <- x f <- function(x,y) { r <- sqrt(x^2+y^2); 10 * sin(r)/r } z <- outer(x, y, f) z[is....
2009 Dec 11
3
`mgp[1:3]' are of differing sign (PR#14130)
Full_Name: Cornell Gonschior Version: 2.10.0 OS: Linux Submission from: (NULL) (212.201.28.40) Hi, in the introduction to R, you can find the following sentence in the par() chapter: "Use tck=0.01 and mgp=c(1,-1.5,0) for internal tick marks." I thought that's nice, because I wanted to have tick marks and tick labels inside and the axis title outside. But: > plot(z, las=1, tck=0.01, mgp=c(1,-1.5,0)) Warnmeldungen: 1: In plot.window(...) : `mgp[1:3]' are of differing sign...
2007 Jan 23
1
How to generate 'minor' ticks in lattice (qqmath)
Dear group, I tried to generate labels for every second tick in lattice (qqmath). Version: 0.14-16 Date: 2006/12/01 R version 2.4.1 (2006-12-18) An example: library(lattice) numy=100 y=runif(numy,min=0,max=1) sig=0.05 numsig=length(which(y<sig)) tck.no=11 # number of ticks tcks=1:tck.no labl=as.character(0.1*tcks-0.1) # label for all ticks labl[seq(2,tck.no-1,2)]="" # delete every second label nums=seq(0,(tck.no-1)/10,(tck.no-1)/100) qqmath(y,distribution=qunif, prepanel=NULL, panel=function(x) { panel.abline(c(0,1),lty=...
2018 Feb 07
0
Re: [libvirt] [PATCH tck] Relabel SELinux when customizing virt-builder image
...entially > >> looses the SELinux labelling that Anaconda had originally setup. Thus we > >> must tell virt-builder to enable SELinux relabelling. > >> > >> Signed-off-by: Daniel P. Berrangé <berrange@redhat.com> > >> --- > >> lib/Sys/Virt/TCK.pm | 2 +- > >> 1 file changed, 1 insertion(+), 1 deletion(-) > >> > >> diff --git a/lib/Sys/Virt/TCK.pm b/lib/Sys/Virt/TCK.pm > >> index e9da8d2..b39f578 100644 > >> --- a/lib/Sys/Virt/TCK.pm > >> +++ b/lib/Sys/Virt/TCK.pm > >> @@ -405...
1998 Jan 08
0
R-beta: Using par(tck=,xaxs=)
I found that par(tck=xx) was ignored and par(xaxs="s") gave an error in v0.61. I've made the following quick hacks in the code to get these to function. Please let me know if I'm setting myself up for trouble and... Thanks for R! ...Steve Oncley (oncley at ucar.edu) --------------------------------...
2003 Mar 17
1
postscript and ps.option metrics
...;10","20","30","40","50","60","70","80","90","100") plot(Year,Movies,ylim=c(1,1000000),xlim=c(1902,2002),log='y',type='o',axes=F) axis(side=2, at=myticks, las=2, labels=mylabs, pos=1900, tck=-0.02) axis(side=2, at=myticks, pos=1900, tck=.95, labels=F) axis(side=2, at=yticks, labels=F, pos=1900, tck=0.01) axis(side=2, at=yticks, labels=F, pos=1900, tck=0.93) axis(side=2, at=mnyticks, las=2, labels=mnylabs, pos=1900, tck=-0.015, cex=.5) axis(side=2, at=mnyticks, las=2, labels=F, pos=19...
1998 Feb 04
1
R-beta: Functionality of tck=1, and mtext()
...iously offset to the right. For example: > par(oma=c(0,0,3,0)) > mtext("Try this", side=3, outer=T) # nothing is observed on x11 > mtext("Now try this", side=3, outer=T, adj=0) # appears in upper right # hand corner 2. tck=1 does not create grid lines. Any call with tck=whatever is ignored. > plot(1,1) > axis(1, at=1.2, tck=1) # standard tick mark below the axis Are there workarounds to these problems? Thanks for any help, Matt ----------------------------------------------------------------------------...
2004 Oct 01
3
Can grid lines color in a plot be specified?
R-help Is there any way to specify the color of grid lines in a simple plot? par(color.tick.marks=c("grey")) plot(rnorm(10),tck=1) Thank you
2010 Aug 25
5
lattice help required
...################ library(lattice) y1 <- rnorm(100,100,10) y2 <- rnorm(100,10,1) facs<-expand.grid(Sites=rep(c("Site I","Site II"),25),Treatment=c("A","B")) pl1<-dotplot(y1 ~ facs$Treatment|facs$Sites, scales = list(x = list(rot = 90, tck=c(1,0)))) pl2<-dotplot(y2 ~ facs$Treatment|facs$Sites, scales = list(x = list(rot = 90, tck=c(1,0)))) print(pl1, split=c(1,2,1,2), more=TRUE) print(pl2, split=c(1,1,1,2)) ##################################################################### but as said, ideally the plots should be...
2009 Jun 17
3
lattice: axis ticks, axis alignment and remove axis from plot
Hi there, I'm a bit confused concerning the axis tck setting in the lattice package as the ticks on left sided axis aren't drawn at all with the following setting: dados <- data.frame(varsep = factor(rep(1:2,10)), i = runif(20)) library(lattice) my.theme <- list( axis.components = list(left = list(tck = 1, pad...
2011 Feb 16
2
Axis positions
Hi everyone. I would like to modify the axis on my plot. First, I would like to make a plot without the box. so I use : plot(x,y, axes = FALSE, type = 'l') Then, I call : axis(1, tck = -0.02) axis(2, tck = -0.02) to have X and Y axis appear. However, I would like them to join at the origin instead of having a space between the 2 axis. I can't find the parameter to modify to get this result. Secondly, is it possible to center X and Y axis so the origin is right in the cent...
2006 Oct 31
1
2.4.0 and lattice 0.14-9: Changed behaviour of scales-argumenttck
Dear list, I have observed a change in the behaviour of the scales-argument tck of xyplot() after having installed R 2.4.0 (for version info see below). The help page of xyplot() says about the scales-argument tck: 'tck' numeric to control length of tick marks. Can be a vector of length 2, to control left/bottom and right/top separately. But if I issue xypl...
2012 Sep 10
2
how to create a segplot in black and white?
...lot(reorder(factor(Species), ratioBiomass ) ~ (- SEratio ) + SEratio , data = dfInOutBiom2,col="black",level = Commercial.Value, colorkey= TRUE, draw.bands = FALSE, centers = Biomass, ends = "both",xlim=range(-SEratio +0.5, SEratio +0.5), scales=list(cex=1.2,x = list(tck = -1),y= list(font = 3,tck=-1)),cex=1.2,ylab=list(font=2,cex=1.2),xlab=list(font=2,cex=1.2), pch=c(1,1,19,19,1,19,19,19,19,1,19,19,1,1,1,1), lwd=3, panel = function(...) { panel.abline(v = 1, lty = 3, lwd=2) panel.segplot(...) }) plotBiomRatio2 Can you help me to print this plot in bla...
2010 Apr 15
1
RFE: reuse of the libguestfs daemon + host API in a externally managed VM
The libvirt-TCK is a integration test suite we are using to validate the correct operation of libvirt drivers. Currently it is just checking the basic operation & functionality of drivers from the host side. we just boot a random Fedora kernel + initrd since we don't actually care that the guest OS boots...
2012 Nov 22
1
[lattice] Increase distance between tick labels and ticks in wireframe plot ("pad")
Hello, I try to increase the distance between tick labels and ticks in a lattice wireframe plot. Here's a minimal example: ## Minimal example x <- y <- z <- c(1,2,3) df <- data.frame(x, y, z) wireframe(z ~ x*y, df, scales = list(arrows = FALSE, col = "black", font = 1, tck=0.6)) I tried the axis.components option (http://r.789695.n4.nabble.com/Lattice-distance-of-tick-labels-from-axis-line-tp3693014p3693014.html). This works for xyplot, but *not* for wireframe: xyplot(z ~ x, df, scales = list(arrows = FALSE, col = "black", font = 1, tck=0.6), par.settin...
2008 Jun 30
3
newbie needs help plotting time series
...ed using R to visualize time series of water level measurements. The code I wrote does exactly what I want: plot(x, a$B112, axes=FALSE, ylim=c(405,410), col="red", pch=15, type="o", ylab="metres above sea level", main="Main Plot Title") axis(2, at=405:410, tck=1, col="gray60") axis.Date(1, at=seq(as.Date("2004-01-01"), as.Date("2008-06-01"), by="month"), labels=seq(as.Date("2004-01-01"), as.Date("2008-06-01"), by="month"), tck=1, col="gray60") Now I wanted to shift the dat...
2013 Dec 11
1
setting effect plot parameters
...is graphics (via the lattice package), not all aspects of the plot can be controlled by standard trellis graphics. I am able to set any parameters that are given in trellis.par.get() easily enough, for example: axis.components <- trellis.par.get("axis.components") axis.components$right$tck <- 0 axis.components$top$tck <- 0 axis.components$left$pad1 <- 2 axis.components$left$pad2 <- 2 trellis.par.set("axis.components", axis.components) but I have been unable to change other axis parameters such as setting the number of ticks on the bottom and left axes. I can do...
2011 Jan 13
3
Rotated, Right-Justified Labels for Shortened Tick Marks
Hello R-help, I'm trying to make a fairly simple plot axis that goes something like this: plot(-10:10,-10:10, yaxt='n') axis(side=2, las=1, hadj=1, tck=-.01, cex.axis=.6) ...but as you can see, the labels are not close enough to the y-axis (where I want them... to save space for publication). Can anybody help me figure out how to move these labels over the the right a bit? Thanks, -D