similar to: Plotting Bivariate Normal Data

Displaying 20 results from an estimated 7000 matches similar to: "Plotting Bivariate Normal Data"

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))
2009 May 26
2
(OT) Does pearson correlation assume bivariate normality of the data?
Dear all, The other day I was reading this post [1] that slightly surprised me: "To reject the null of no correlation, an hypothsis test based on the normal distribution. If normality is not the base assumption your working from then p-values, significance tests and conf. intervals dont mean much (the value of the coefficient is not reliable) " (BOB SAMOHYL). To me this implied that in
2010 Mar 27
5
producing a QQ plot.
Hello everyone I'm a beginner in Stats and R, I'm using R 2.10.1. I need to create a multivariate qq plot, there is 8 variable group with each has 55 number of input. An example of what I did so far, just to get my point out: > data=read.csv(file.choose(),header=T) > data country village group av_expen P2ary_ed no_fisher 1 Cook Islands Aitutaki D
2012 Mar 28
2
Test Normality
Good Night I made different test to check normality and multinormality in my dataset, but I donĀ“t know which test is better. To verify univariate normality I checked: shapiro.test, cvm.test, ad.test, lillie.test, sf.test or jaque.bera.test and To verify multivariate normal distribution I use mardia, mvShapiro.Test, mvsf, mshapiro.test, mvnorm.e. I have a dataset with almost 1000 data and 9
2012 Jul 27
3
bivariate normal
Dear list members I need a function that calculates the bivariate normal distribution for each observation. It is part of a likelihood function and I have 1000's of cases. As I understand it I cannot use packages like "mvtnorm" because it requres a covariance matrix of the same dimension as the number of observations. Basically what I need is a function that takes as arguments a
2010 Apr 06
2
checking bivariate normality
x <- iris$Sepal.Length[1:50]/iris$Sepal.Width[1:50] y <- iris$Petal.Length[1:50]/iris$Petal.Width[1:50] I want to check whether (x,y) follows a bivariate normal distribution or not, using density plot or scatter plot. Is it possible to plot a bivariate density in R. I cant find any. Arindam Fadikar M.Stat Indian Statistical Institute. New Delhi, India [[alternative HTML version
2004 Nov 16
2
help on EM Algorithm for bivariate normal
Hi, I woul like to know if it is possible to have a "R code" to generate EM Algorithm for a normal bivariate mixture. Best regard, S.F.
2008 Jan 23
2
from a normal bivariate distribution to the marginal one
Hello, I'm quite new with R and so I would like to know if there is a command to calculate an integral. In particular I simulated a bivariate normal distribution using these simple lines: rbivnorm <- function(n, # sample size mux, # expected value of x muy, # expected value of Y sigmax, # standard deviation of
2008 Oct 01
2
Bivariate normal
Package mvtnorm provides dmvnorm, pmvnorm that can be used to compute Pr(X=x,Y=y) and Pr(X<x,Y<y) for a bivariate normal. Are there functions that would compute Pr(X<x,Y=y)? I'm currently using "integrate" with dmvnorm but it is too slow.
2007 Jul 25
2
Regarding Bivariate normal distribution.
Dear all R gurus, My question is related to statistics rather directly to R. Suppose (X,Y) has a bivariate normal distrubution. I want to find two values of X and Y say x, and y respectively, such that: P[X<x, Y<y] = 0.05 My questions are : 1. Can x and y be uniquely found? 2. If it is, how I can find them using R Your help will be highly appreciated. Thanks and regards,
2006 Feb 13
2
bivariate normal distribution
Hi, there. Does anyone know the R function for calculating the cdf of bivariate normal distribution function? Thanks. Yulei [[alternative HTML version deleted]]
2012 Apr 19
3
Bivariate normal integral
hello, I'm trying to improve the speed of my calculation but didn't get to a satisfying result. It's about the numerical Integration of a bivariate normal distribution. The code I'm currently using x <- qnorm(seq(.Machine$double.xmin,c(1-2*.Machine$double.eps),by=0.01), mean=0,sd=1) rho <- 0.5 integral <- function(rho,x1){
2018 Apr 12
3
Bivariate Normal Distribution Plots
R-Help I am attempting to create a series of bivariate normal distributions. So using the mvtnorm library I have created the following code ... # Standard deviations and correlation sig_x <- 1 sig_y <- 1 rho_xy <- 0.0 # Covariance between X and Y sig_xy <- rho_xy * sig_x *sig_y # Covariance matrix Sigma_xy <- matrix(c(sig_x ^ 2, sig_xy, sig_xy, sig_y ^ 2), nrow = 2, ncol = 2)
2002 May 01
3
bivariate normal cdf and rho
Suppose F(x, y; rho) is the cdf of a bivariate normal distribution, with standardized marginals and correlation parameter rho. For any fixed x and y, I wonder if F(x, y; rho) is a monotone increasing function of rho, i.e., there is a 1 to 1 map from rho to F(x, y; rho). I explored it using the function pmvnorm in package mvtnorm with different x and y. The plot suggests the statement may be true.
2012 Apr 25
2
comparison of bivariate normal distributions
sorry for cross-posting Dear all, I have tow (several) bivariate distributions with a known mean and variance-covariance structure (hence a known density function) that I would like to compare in order to get an intersect that tells me something about "how different" these distributions are (as t-statistics for univariate distributions). In order to visualize what I mean hear a little
2002 Nov 12
1
Probabilities for bivariate normal distribution with adapt
Dear R-List: I`m trying to calculate the probabilities for a bivariate normal distribution while using the mvtnorm-package(dmvnorm) and the adapt-package for multidimensional integration. The problem is that I can`t specify the upper bound in the adapt-package the way I need it because I don`t need a rectangular area. I want to calculate the probability starting at the origin under the line y=x.
2011 Aug 25
1
Bivariate normal regression in R
Hello everyone, I need to fit a bivariate normal regression model to a dataset where the same covariate (say, X) influences two separate but correlated responses (say, Y1 and Y2). So, the bivariate model would look like : Y1 = a1 + b1*X + e1 Y2 = a2 + b2*X + e2 where e1 and e2 are error terms which can be correlated. Is there any package in R which can help me fit this model ? Any help will be
2005 May 06
2
bivariate normal cdf
-- R Help List -- I am looking for a bivariate normal cdf routine in R. I have some fortran routines for this, which appear to be based on 15-point quadrature. Any guidance/suggestions on making these in loadable R-functions would be appreciated. Thanks, Dan =-=-=-=-=-=-=-=-=-=-=-=-=-=-=-=-=-=-=-=-=-=-=-=-=-=-=-= Daniel A. Powers, Ph.D. Department of Sociology University of Texas at Austin
2005 Mar 18
1
Bivariate normal distribution and correlation
Suppose I know the value of cumulative bivariate standard normal distribution. How can I solve correlation between variables? Pekka --------------------------------- [[alternative HTML version deleted]]
2004 Jan 21
1
outlier identification: is there a redundancy-invariant substitution for mahalanobis distances?
Dear R-experts, Searching the help archives I found a recommendation to do multivariate outlier identification by mahalanobis distances based on a robustly estimated covariance matrix and compare the resulting distances to a chi^2-distribution with p (number of your variables) degrees of freedom. I understand that compared to euclidean distances this has the advantage of being scale-invariant.