Displaying 20 results from an estimated 2000 matches similar to: "The following object(s) are masked from ‘package:stats’"
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
2009 Nov 02
7
qqplot
Hi,
We could use qqplot to see how two distributions are different from each other. To show better how they are different (departs from the straight line), how is it possible to plot the straight line that goes through them? I am looking for some thing like qqline for qqnorm. I thought of abline but how to determine the slope and intercept?
Best wishes,
Carol
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),
2005 Feb 25
4
Temporal Analysis of variable x; How to select the outlier threshold in R?
For a financial data set with large variance, I'm trying to find the
outlier threshold of one variable "x" over a two year period. I
qqplot(x2001, x2002) and found a normal distribution. The latter part of
the normal distribution did not look linear though. Is there a suitable
method in R to find the outlier threshold of this variable from 2001 and
2002 in R?
2001 Oct 16
5
help me
Hy,
I have dowloaded the R-version for Windows.
I would want to plot different pictures on the same device, but I am not
able to do it (i.e I would like make 2 qqplot on the same graphic).
Can you help me?
Thanks in advance
Davide
reply to: d.tarfanelli at libero.it
-.-.-.-.-.-.-.-.-.-.-.-.-.-.-.-.-.-.-.-.-.-.-.-.-.-.-.-.-.-.-.-.-.-.-.-.-.-.-.-
r-help mailing list -- Read
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
2007 Mar 26
1
Problem in loading all packages all at once
Hi All
Please see the Rprofile file which i have modified as follows and after
that when I start R then I see that R says to me "TRUE" for all the
packages implying that all loaded at once.
But when i try to use commands as simple as help("lm"), it doesnt work nor
any of the menu "Packages" is not working.
Although the regression using lm ( Y ~ X ) is working
2007 Nov 30
6
Generating a value
How do I generate a value in R from a poisson distribution with mean 20?
Thanks!
--
View this message in context: http://www.nabble.com/Generating-a-value-tf4922234.html#a14086120
Sent from the R help mailing list archive at Nabble.com.
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),
2010 May 29
3
adding statistical output to a plot
I have written a function to emulate minitab's QQ plotting output (with SW
test and AD test results on the graph):
mtab.norm<-function(x)
{ library(nortest)
library(lattice)
x<-as.numeric(x)
x<-as.vector(x)
plot.ht<-4.6
plot.wd<-4.6
pt.ht=plot.ht/5
txt.sz<-(plot.ht/7.5)
X11(width=plot.wd, height=plot.ht, bg='gray96')
qqplot(x, pch=16, cex=pt.ht,
2012 Jan 11
1
meta-analysis normal quantile plot metafor
Hello,
I once used the metawin software to perform a meta-analysis (see
metawinsoft, Rosenberg et al.) and produced normal qqplot to test for
a potential bias in the dataset.
I now want to re-use the same dataset with the package metafor by W.
Viechtbauer (great package btw).
I run the qqnorm.rma.uni function. I use standardized effect sizes as
in metawin.
QQplot generated with metafor differs
2009 Feb 12
3
Website, book, paper, etc. that shows example plots of distributions?
By any chance is any one aware of a website, book, paper, etc. or combinations of those sources that show plots of different distributions?
After reading a pretty good whitepaper I became aware of the benefit of I the benefit of doing Q-Q plots and histograms to help assess a distribution. The whitepaper is called:
"Univariate Analysis and Normality Test Using SAS, Stata, and SPSS*" ,
2009 Oct 04
1
exTremes and ismev (PR#13981)
Greetings
I am attempting to load exTremes and this is what I get...
*> utils:::menuInstallPkgs()
--- Please select a CRAN mirror for use in this session ---
trying URL '
http://cran.uk.r-project.org/bin/windows/contrib/2.9/extRemes_1.60.zip'
Content type 'application/zip' length 676182 bytes (660 Kb)
opened URL
downloaded 660 Kb
package 'extRemes' successfully
2009 Sep 08
0
About " create dataset permanently in package "
Hi Yan,
Before I try to answer your question: please send R questions to the r-
help mailing list (cc'd here). You will likely get your answer more
quickly (since I'm not the only one looking at it) and it might help
other people who get stuck on a similar situation by finding the
answer on a public forum (just like you did).
On Sep 8, 2009, at 5:44 AM, Yan Hui wrote:
> Dear
2009 Sep 17
2
QQ plotting of various distributions...
Hello!
I am trying with this question again:
I would like to test few distributional assumptions for some behavioral
response data. There are few theories about true distribution of those
data, like: normal, lognormal, gamma, ex-Gaussian
(exponential-Gaussian), Wald (inverse Gaussian) etc. The best way would
be via qq-plot, to show to students differences. First two are trivial:
qqnorm(dat$X)
2003 Jul 18
2
Probability plotting with R
Hello,
Our professor asked us to do probability plotting using weibull paper,
exponential paper, normal, log-normal paper, etc. I know I can create Q-Q
plot for normal dist. and see if all te points are on one line. How do I
go about other distributions?
I tried generating different samples and use the general qq function.
However, I could not do it since I don't know the population
2001 Nov 27
2
overlaying qqnorm plots...
I know this topic has had plenty of discussion in the last couple of days,
but....
I've been trying to compare the effects of different fitted methods for
systems of equations (OLS, SUR, 2SLS, 3SLS ) and would like to compare the
residual plots (easy) and the qqnorm/qqplot of the fits for the different
fitted methdos. For example,
qqnorm( residuals( lm( q ~ p + f + a ) ) )
par( new = TRUE )
2016 Apr 04
2
question about probplot in e1071 package
Hello!
I am using probplot in the e1071 package and want to do something like the
following, only with the the 2nd plot overlaying the first. I can't seem to
make it work. Any suggestions?
*library(e1071)
**x <- rnorm(100, mean=5)*
*y <- rnorm(100, mean=3)*
*probplot(x, line=FALSE)
*
*probplot(y, line=FALSE)
*
*Regards,*
*Tom*
[[alternative HTML version deleted]]
2006 Jul 29
1
boxcox transformation
I've got a vector of data (hours to drive from a to b) y.
After a qqplot I know, that they don't fit the normal probability.
I would like to transform these data with the boxcox transformation
(MASS), that they fit the model.
When I try
ybx<-boxcox(y~1,0)
qqnorm(ybx)
the plot is different from
library (TeachingDemos)
ybct<-bct(y,0) //
qqnorm(ybct)
How can I transform
2002 Nov 01
2
Empirical distribution
If some can help to find under wich package can i find the commando's
wich i schould to use to work with the empirical cummulative (ecdf)
distribution and also the QQplot.
Zmarrou Hicham
Univesity of Amsterdam
-.-.-.-.-.-.-.-.-.-.-.-.-.-.-.-.-.-.-.-.-.-.-.-.-.-.-.-.-.-.-.-.-.-.-.-.-.-.-.-
r-help mailing list -- Read http://www.ci.tuwien.ac.at/~hornik/R/R-FAQ.html
Send "info",