«ggplot2» 태그된 질문

ggplot2는 "Grammar of Graphics"원칙에 기반한 R 용 향상된 플로팅 라이브러리입니다. (a) 질문 및 / 또는 예상 답변의 중요한 부분으로`ggplot2`를 포함하고 & (b)`ggplot2`를 사용하는 방법에 관한 것이 아닌 * 주제 * 질문에이 태그를 사용합니다.

1
ggplot 또는 타원 패키지로 95 % CI 타원을 플로팅 할 때 다른 결과 얻기
protoclust{protoclust}내 데이터를 분류하고 클래스별로 색상을 지정하고 각 클래스에 대해 95 % 신뢰 구간에 대해 타원을 겹치는 데 사용되는 각 변수 쌍에 대해 스 캐터 플롯을 작성 하여 클러스터링 (으로 생성 ) 결과를 시각화하고 싶습니다 ( elipses-classes는 각 변수 쌍에서 겹칩니다). 타원 그리기를 두 가지 방법으로 구현했으며 결과 타원이 다릅니다! (첫 …

3
ggplot2를 사용하여 두 데이터 세트를 QQ 플롯과 비교하는 방법은 무엇입니까?
통계와 R 초보자 모두 1 : 1의 종횡비로 qqplots를 생성하는 데 어려움을 겪고 있습니다. ggplot2는 기본 R 플로팅 패키지보다 플로팅에 대해 훨씬 많은 제어 기능을 제공하는 것으로 보이지만 ggplot2에서 qqplot을 수행하여 두 데이터 세트를 비교하는 방법을 알 수 없습니다. 그래서 내 질문에, ggplot2는 다음과 같은 것이 무엇입니까? qqplot(datset1,dataset2)

2
ggplot2에서 지속적인 상호 작용으로 어떻게 연속성을 그릴 수 있습니까?
데이터가 있다고 가정 해 봅시다. x1 <- rnorm(100,2,10) x2 <- rnorm(100,2,10) y <- x1+x2+x1*x2+rnorm(100,1,2) dat <- data.frame(y=y,x1=x1,x2=x2) res <- lm(y~x1*x2,data=dat) summary(res) x1이 X 축에 있고 x2가 3 줄로 표시되도록 연속 상호 작용으로 연속성을 플롯하고 싶습니다. 하나는 Z 점수 0에서 x2, 하나는 Z 점수 +1, 다른 하나는 -1의 Z- 점수, 각 …

1
노치 상자 그림을 해석하는 방법
일부 EDA를 수행하는 동안 요인의 두 수준 간 차이를 설명하기 위해 상자 그림을 사용하기로 결정했습니다. ggplot 이 박스 플롯을 렌더링하는 방식 은 만족 스럽지만 약간 단순합니다 (아래의 첫 번째 플롯). 박스 플롯의 특성을 연구하는 동안 노치를 실험하기 시작했습니다. 나는 노치가 중앙값 주위에 CI를 표시한다는 것을 이해하고 두 상자의 노치가 겹치지 …

1
감마 분포의 적합 그래프와 실제 그래프를 한 플롯에 그리는 방법은 무엇입니까?
필요한 패키지를로드하십시오. library(ggplot2) library(MASS) 감마 분포에 적합한 10,000 개의 숫자를 생성합니다. x <- round(rgamma(100000,shape = 2,rate = 0.2),1) x <- x[which(x>0)] 우리가 어느 분포 x에 적합한지를 모르는 확률 밀도 함수를 그립니다. t1 <- as.data.frame(table(x)) names(t1) <- c("x","y") t1 <- transform(t1,x=as.numeric(as.character(x))) t1$y <- t1$y/sum(t1[,2]) ggplot() + geom_point(data = t1,aes(x = x,y …

2
데이터에 대한 ROC 곡선 계산
그래서, 나는 16 개의 시험을 가지고 있는데, 여기에서 Hamming Distance를 사용하여 생체 특성으로부터 사람을 인증하려고합니다. 임계 값이 3.5로 설정되었습니다. 내 데이터는 다음과 같으며 1 번 시험 만 참 긍정입니다. Trial Hamming Distance 1 0.34 2 0.37 3 0.34 4 0.29 5 0.55 6 0.47 7 0.47 8 0.32 9 0.39 …
9 mathematical-statistics  roc  classification  cross-validation  pac-learning  r  anova  survival  hazard  machine-learning  data-mining  hypothesis-testing  regression  random-variable  non-independent  normal-distribution  approximation  central-limit-theorem  interpolation  splines  distributions  kernel-smoothing  r  data-visualization  ggplot2  distributions  binomial  random-variable  poisson-distribution  simulation  kalman-filter  regression  lasso  regularization  lme4-nlme  model-selection  aic  r  mcmc  dlm  particle-filter  r  panel-data  multilevel-analysis  model-selection  entropy  graphical-model  r  distributions  quantiles  qq-plot  svm  matlab  regression  lasso  regularization  entropy  inference  r  distributions  dataset  algorithms  matrix-decomposition  regression  modeling  interaction  regularization  expected-value  exponential  gamma-distribution  mcmc  gibbs  probability  self-study  normality-assumption  naive-bayes  bayes-optimal-classifier  standard-deviation  classification  optimization  control-chart  engineering-statistics  regression  lasso  regularization  regression  references  lasso  regularization  elastic-net  r  distributions  aggregation  clustering  algorithms  regression  correlation  modeling  distributions  time-series  standard-deviation  goodness-of-fit  hypothesis-testing  statistical-significance  sample  binary-data  estimation  random-variable  interpolation  distributions  probability  chi-squared  predictor  outliers  regression  modeling  interaction 
당사 사이트를 사용함과 동시에 당사의 쿠키 정책개인정보 보호정책을 읽고 이해하였음을 인정하는 것으로 간주합니다.
Licensed under cc by-sa 3.0 with attribution required.