web-dev-qa-db-ja.com

Rでの箱ひげ図の外れ値のラベル付け

Rでggplotを使用してボックスプロットを作成するコードがあります。年とバトルで外れ値にラベルを付けたいと思います。

ここに私のboxplotを作成するための私のコードがあります

require(ggplot2)
ggplot(seabattle, aes(x=PortugesOutcome,y=RatioPort2Dutch ),xlim="OutCome", 
y="Ratio of Portuguese to Dutch/British ships") + 
geom_boxplot(outlier.size=2,outlier.colour="green") + 
stat_summary(fun.y="mean", geom = "point", shape=23, size =3, fill="pink") + 
ggtitle("Portugese Sea Battles")

誰でも助けることができますか?これが正しいことはわかっていました。外れ値にラベルを付けたいだけです。

17
Deborah_Watson

以下は、dplyrと組み込みのmtcarsデータセットを使用する再現可能なソリューションです。

コードの説明:最初に、渡された値が外れ値である場合にブール値is_outlierを返す関数TRUE/FALSEを作成します。次に、「分析/チェック」を実行し、データをプロットします。まず、変数[group_by](この例ではcyl、あなたの例ではPortugesOutcomeになります)およびoutlierの呼び出しに変数mutateを追加します(drat変数が外れ値である場合[これはあなたの例のRatioPort2Dutchに対応することに注意してください]、 drat値を渡す、そうでない場合はNAを返すので、値はプロットされません)。最後に、結果をプロットし、geom_textおよび新しい変数に等しい美的ラベルを介してテキスト値をプロットします。さらに、hjustでテキストをオフセット(少し右にスライド)することで、外れ値の上ではなく、隣の値を見ることができます。

library(dplyr)
library(ggplot2)

is_outlier <- function(x) {
  return(x < quantile(x, 0.25) - 1.5 * IQR(x) | x > quantile(x, 0.75) + 1.5 * IQR(x))
}

mtcars %>%
  group_by(cyl) %>%
  mutate(outlier = ifelse(is_outlier(drat), drat, as.numeric(NA))) %>%
  ggplot(., aes(x = factor(cyl), y = drat)) +
    geom_boxplot() +
    geom_text(aes(label = outlier), na.rm = TRUE, hjust = -0.3)

Boxplot

28
JasonAizkalns

これはあなたのために働きますか?

library(ggplot2)
library(data.table)

#generate some data
set.seed(123)
n=500
dat <- data.table(group=c("A","B"),value=rnorm(n))

ggplotはデフォルトで、ボックスの境界から1.5 * IQRを超えるものとして外れ値を定義します。

#function that takes in vector of data and a coefficient,
#returns boolean vector if a certain point is an outlier or not
check_outlier <- function(v, coef=1.5){
  quantiles <- quantile(v,probs=c(0.25,0.75))
  IQR <- quantiles[2]-quantiles[1]
  res <- v < (quantiles[1]-coef*IQR)|v > (quantiles[2]+coef*IQR)
  return(res)
}

#apply this to our data
dat[,outlier:=check_outlier(value),by=group]
dat[,label:=ifelse(outlier,"label","")]

#plot
ggplot(dat,aes(x=group,y=value))+geom_boxplot()+geom_text(aes(label=label),hjust=-0.3)

enter image description here

7
Heroka

外れ値を行名でラベル付けするには( JasonAizkalns answerに基づいて)

library(dplyr)
library(ggplot2)
library(tibble)

is_outlier <- function(x) {
  return(x < quantile(x, 0.25) - 1.5 * IQR(x) | x > quantile(x, 0.75) + 1.5 * IQR(x))
}

dat <- mtcars %>% tibble::rownames_to_column(var="outlier") %>% group_by(cyl) %>% mutate(is_outlier=ifelse(is_outlier(drat), drat, as.numeric(NA)))
dat$outlier[which(is.na(dat$is_outlier))] <- as.numeric(NA)

ggplot(dat, aes(y=drat, x=factor(cyl))) + geom_boxplot() + geom_text(aes(label=outlier),na.rm=TRUE,Nudge_y=0.05)

boxplot with outliers name

6
qfazille

上記と同様の答えですが、ggplot2から外れ値を直接取得するため、メソッドの潜在的な競合を回避できます。

# calculate boxplot object
g <- ggplot(mtcars, aes(factor(cyl), drat)) + geom_boxplot()

# get list of outliers 
out <- ggplot_build(g)[["data"]][[1]][["outliers"]]

# label list elements with factor levels
names(out) <- levels(factor(mtcars$cyl))

# convert to tidy data
tidyout <- purrr::map_df(out, tibble::as_tibble, .id = "cyl")

# plot boxplots with labels
g + geom_text(data = tidyout, aes(cyl, value, label = value), 
              hjust = -.3)

enter image description here

3
jtr13

適切なstat_summary呼び出しを使用して、ggplot内で簡単にこれを行うことができます。

ggplot(mtcars, aes(x = factor(cyl), y = drat, fill = factor(cyl))) + 
  geom_boxplot() +
  stat_summary(
    aes(label = round(stat(y), 1)),
    geom = "text", 
    fun.y = function(y) { o <- boxplot.stats(y)$out; if(length(o) == 0) NA else o },
    hjust = -1
  )

enter image description here

2
Axeman