Displaying 20 results from an estimated 10000 matches similar to: "non-generic functions"
2011 Mar 25
1
multiple plots with QQplot of PerformanceAnalytics
Hi All,
I am trying to plot 4 graphs on to 1 page using layout(...), or par(mfcol =
c(...)); with the function QQplot from the package PerformanceAnalytics.
The problem is that, no matter what order I use, it only plots 3 graphs on to 1
page and the last QQplot is shunted to the next page.
Also, this only happens to the QQplot, i.e. there is no problem with 4
Histograms.
set.seed(1033)
data
2017 Jul 23
2
cannot use package RcmdrPlugin.plotByGroup
Dear Lu Wei,
> -----Original Message-----
> From: R-help [mailto:r-help-bounces at r-project.org] On Behalf Of Lu Wei
> Sent: Sunday, July 23, 2017 12:27 AM
> To: r-help at stat.math.ethz.ch
> Subject: Re: [R] cannot use package RcmdrPlugin.plotByGroup
>
> On 2017-7-23 6:21, Fox, John wrote:
> > Dear Lu Wei,
> >
> > I'm the author of the Rcmdr package
2011 Nov 16
2
outlier identify in qqplot
Dear Community,
I want to identify outliers in my data. I don't know how to use identify
command in the plots obtained.
I've gone through help files and use mahalanobis example for my purpose:
NormalMultivarianteComparefunc <- function(x) {
Sx <- cov(x)
D2 <- mahalanobis(x, colMeans(x), Sx)
plot(density(D2, bw=.5), main="Squared Mahalanobis distances, n=nrow(x),
2012 May 11
1
identify() doesn't return "true" numbers
Dear R community.
I am using the identify() function to identify outliers in my dataset.
This is the code I am using:
####################################################################
# Function to allow identifying points in the QQ plot (by mouseclicking)
qqInteractive <- function(..., IDENTIFY = TRUE)
{
qqplot(...) -> X
abline(a=0,b=1)
if(IDENTIFY) return(identify(X))
2017 Jul 23
0
cannot use package RcmdrPlugin.plotByGroup
On 2017-7-23 20:41, Fox, John wrote:> ...
> The Rcmdr uses the qqPlot() function in the car package. In the next
> version of the car package, qqPlot() will be able to plot by groups,
> and when that happens, I'll incorporate the feature in the Rcmdr.
>
> More generally, however, if you learn to write R commands you'll be
> able to make customized plots. It would be
2012 Feb 10
1
making multiple lines using qqplot
Hi Everyone,
I want to make 3 lines on the same graph (not as subplots, all in the same
window, one on top of each other) and I want them to be quantile-quantile
plots (qqplot). Essentially, I am looking for the equivalent of Matlab's
"hold on" command to use with qqplot. I know I can use 'points' or 'lines',
but these do not give me a qqplot (only appear to work
1999 Aug 31
1
Suggestion for qqplot() improvement
>>>>> On Tue, 31 Aug 1999 14:57, Werner Stahel <stahel@stat.math.ethz.ch> said:
WSt> Here is a suggestion. It seems that qqplots, comparing a sample
WSt> to a distribution other than the normal, are not explicitly
WSt> available in S or R. I found
(in S-plus / Trellis it is, see below)
WSt> qqplot(y, rt(300, df = 5))
WSt> as an
2009 Feb 08
2
how to make this qq plot in lattice and/or ggplot2
Hi Group,
Here is some data.
p <- runif(1000) # sample data
groups <- rep(c(1,2),each=500) #conditioning variable
mydata <- cbind(p,groups)
n <- length(p)
u <- (1:n)/(n + 1) # uniform distribution reference for qqplot
logp <- -log(p,base=10)
logu <- -log(u,base=10)
qqplot(logp,logu)
How can I make the above qqplot in lattice and/or ggplot2. The sample
is uniform, and I take
2003 Apr 29
4
thick plot lines
Dear People,
In a qqplot I am doing, I get lines/points that are very thick. I've tried
setting the lwd variable to 0.1, but it doesn't seem to have any effect.
Also, I have set the value of lty to dashed, but I still get dots. The
command looks like
qqplot(cdf.inv(seq(0,1,length=size),theta,pos,len),empmargdistvec(len,theta,pos,size),
xlim=c(-theta,theta), ylim=c(-theta,theta),
2017 Jul 24
1
cannot use package RcmdrPlugin.plotByGroup
Dear Lu Wei,
> -----Original Message-----
> From: R-help [mailto:r-help-bounces at r-project.org] On Behalf Of Lu Wei
> Sent: Sunday, July 23, 2017 11:28 AM
> To: r-help at stat.math.ethz.ch
> Subject: Re: [R] cannot use package RcmdrPlugin.plotByGroup
>
> On 2017-7-23 20:41, Fox, John wrote:> ...
> > The Rcmdr uses the qqPlot() function in the car package. In the
2006 Feb 06
2
qqplot
Hello,
I would like to use qqplot() to compare two
experimental distributions. But I do not understand
how qqplot() compute quantiles. In fact, quantile() do
not return the same results.
Thank you for your help.
Vincent.
2001 Jan 05
1
pairs(NxK_Matrix,panel=qqplot) (PR#803)
Full_Name: Matthias von Davier
Version: 1.2.0
OS: linux
Submission from: (NULL) (144.81.31.148)
pairs(NxK_Matrix,panel=qqplot)
produces a message
Error in pairs.default(NxK_Matrix,panel=qqplot) :
The panel function made a new plot
best regards and a happy new year
-.-.-.-.-.-.-.-.-.-.-.-.-.-.-.-.-.-.-.-.-.-.-.-.-.-.-.-.-.-.-.-.-.-.-.-.-.-.-.-
r-devel mailing list -- Read
2009 Dec 23
2
how to create normal qqplot with the 95% confidence interval
hi everyone!
season's greetings!
is there any way that i can create a normal qqplot showing, aside from the
qqline, the 95% confidence limits? thank you very much..
happy holidays!
--
View this message in context: http://n4.nabble.com/how-to-create-normal-qqplot-with-the-95-confidence-interval-tp977727p977727.html
Sent from the R help mailing list archive at Nabble.com.
2010 Jan 21
1
Rgeneric.py assists in rearranging generic function definitions
I've attached a script I wrote that pulls all the setGeneric definitions
out of a set of R files and puts them in a separate file, default
allGenerics.R. I thought it might help others who find themselves in a
similar situation.
The "situation" was that I had to change the order in which files in my
package were parsed; the scheme in which the generic definition is in
the
2010 Jun 24
4
Simple qqplot question
I am a beginner in R, so please don't step on me if this is too
simple. I have two data sets datax and datay for which I created a
qqplot
qqplot(datax,datay)
but now I want a line that indicates the perfect match so that I can
see how much the plot diverts from the ideal. This ideal however is
not normal, so I think qqnorm and qqline cannot be applied.
Perhaps you can help?
Ralf
2012 Nov 29
1
QQplot
Hi!
<http://r.789695.n4.nabble.com/file/n4651293/qq.png>
We are stuck with a problem considering the qqplot of a dataset.
We are trying to discover what kind of distribution this is. We already
tried to normal, exponential or the logaritmical distribution but none of
those are able to solve our problem. Is there someone able to tell us what
kind deformation we should try?
(I'm
2008 Feb 24
2
Generic Functions
Hi
I have some problems in defining new generic functions and classes. Just
have a look at the following example:
require(fPortfolio)
setClass("PROBECLASS",
representation(
type="character"
)
)
isGeneric("setType<-")
#Returns
TRUE
#I would like to define a specific function for
2008 Feb 24
2
Generic Functions
Hi
I have some problems in defining new generic functions and classes. Just
have a look at the following example:
require(fPortfolio)
setClass("PROBECLASS",
representation(
type="character"
)
)
isGeneric("setType<-")
#Returns
TRUE
#I would like to define a specific function for
2012 May 09
1
QQplots format
Dear R help,
I tried to plot two qq plots in the same window using the code below.? Somehow it is plotting only one at a time.?? I borrowed the print function from xyplot. ?
pdf("QQplotCorrUncorr.pdf")
qq1<-qqPlot(residuals(fm), main="QQ plot for Correlated Model")
qq2 <-qqPlot(residuals(fma), main="QQ plot for Uncorrelated Model")
print(qq1, pos = c(0.0,
2005 Jan 19
2
signif() generic
Dear list,
I'm trying to write a class for Gaussian error propagation of measured
values and their (estimated) errors,
> setClass("sec", representation(val="numeric", err="numeric"))
I've already successfully implemented basic arithmetics using mostly the
"Arith" group generics. But I'm running into trouble when trying to get
signif() to