Displaying 20 results from an estimated 2000 matches similar to: "plot.times error -- missing or illegal tck parameter (PR#601)"
2018 Feb 06
2
Re: [libvirt] [PATCH tck] Relabel SELinux when customizing virt-builder image
On 02/06/2018 10:53 AM, Pino Toscano wrote:
> On Tuesday, 6 February 2018 16:40:04 CET Daniel P. Berrangé wrote:
>> When you tell virt-builder to 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é
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.na(z)] <- 1
# 'bg' works but 'tck' is not showing
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,
1998 Feb 04
1
R-beta: Functionality of tck=1, and mtext()
In the version of R that I am running I have found two advertised
features that don't appear to work correctly:
Version 0.61.0 Alpha (December 21, 1997)
(installed using r-base-0.61.0-2.i386.rpm)
1. mtext adj parameter is seriously 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
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?
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)
-------------------------------------------------------
A hack to get par(tck) to work:
2018 Feb 07
0
Re: [libvirt] [PATCH tck] Relabel SELinux when customizing virt-builder image
On Tue, Feb 06, 2018 at 12:50:51PM -0500, Laine Stump wrote:
> On 02/06/2018 10:53 AM, Pino Toscano wrote:
> > On Tuesday, 6 February 2018 16:40:04 CET Daniel P. Berrangé wrote:
> >> When you tell virt-builder to install extra RPMs, this potentially
> >> looses the SELinux labelling that Anaconda had originally setup. Thus we
> >> must tell virt-builder to
2009 May 06
1
Add trend line to XYPlot using a subset of the original data
I've created an xyplot that I want to add a trend line to using a subset of
the data.
The xyplot is
xyplot(X9444500~WY,data=mynewdata,xlim=c(1900,2020),ylab="TEST",
xlab="",ylim=c(100,100000),scales=list(x=list(at=c(1900,1920,1940,1960,1980,2000,2020),axs="r",tck=-1),y=list(log=TRUE,tck=-100,at=c(100,1000,10000,100000))),
panel=function(x,y,...) {
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
1998 Feb 17
0
"tck" parameter
I have been making some changes to the axis drawing code which will
allow users to use par(tck=...) to produce grid lines and tick marks
which go into a plot rather than pointing outwards.
I don't particularly like the strategy that S uses for determining
tick mark size so I have introduces an alternative mechanism as well.
There is now a new "par" parameter called "tcl"
2004 Aug 25
3
Beginners Question: Make nlm work
Hello,
I'm new to this and am trying to teach myself some R by plotting
biological data. The growth curve in question is supposed to be fitted
to the Verhulst equation, which may be transcribed as follows:
f(x)=a/(1+((a-0.008)/0.008)*exp(-(b*x)))
- for a known population density (0.008) at t(0).
I am trying to rework the example from "An Introduction to R" (p. 72)
for my case and
2005 Aug 18
1
axis label justified
Hi, I am trying to make my axis labels left justified,
and have used adj=0 in the axis() without success. Can
anyone have a suggestion?
axis(2,at=1:50,labels=paste('a',1:50,sep=''),las=2,cex.axis=0.5,adj=0,tck=0,mgp=c(3,0.5,0))
Thanks
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
xyplot( y ~ x, scales=
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, pad1 = 1, pad2 =
2), top = list(tck = 0, pad1
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 into any particular state, we only care that its
running in some form.
We would
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
2013 Dec 11
1
setting effect plot parameters
I have tried to set parameters of an effects plot with moderate success, but I'm finding that although the plot(effect()) method uses trellis 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 <-
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
2010 Nov 22
2
xlim=c(min(x), max(x)) still produces extra margin on both sides of x axis in plot()
code:
op <-
par(bg='black',fg='gray',col='gray',col.axis='gray',col.lab='gray',col.main='gray',col.sub='gray',mai=c(0,0,0,0),
tck = 0.01, mgp = c(0, -1.4, 0), mar=c(0,0,0,0))
plot(x,y,ylim=c(-20,20),xlim=c(min(x),max(x)),pch='X',col = rgb(1,1,1,
0.5),yaxt="n", ann=FALSE)
abline(v=c(min(x),max(x)), lty=3,
2006 Jul 16
1
break axis using plotrix
Dear all,
I am trying to plot some data with differing range in y-values with
type="b", adding error bars and break the y-axis into two parts, one
lower part from 12 to 20, and one upper part from 34 to 40.
I have tried to follow the basic ideas from the script provided here by
Jim Lemon:
http://finzi.psych.upenn.edu/R/Rhelp02a/archive/56487.html
My attempt looks like this: