This vignette provides a basic introduction to spectral analysis of Electroencephalography (EEG) signal from a sleep record file.
EEG refers to all the methods of recording, analysis and interpretation of the electrical activity of the brain. In clinical EEG, multiple electrodes are usually placed on the scalp, measuring its superficial activity over time. Electrodes are typically arranged using the standardized International 10-20 system [1], in order to enhance analysis reproducibility.
EEG is a major component in sleep analysis. Sleep stages, such as slow wave sleep or paradoxical sleep are partly defined over visual EEG characteristics [2]. Many sleep related disorders can be identified in EEG data. Polysomnography (PSG), the gold standard exam in sleep medicine, includes EEG along many other physiological signals [3].
The National Sleep Research
Resource (NSRR) is a repository of sleep databases containing
polysomnographic sleep recordings from various studies. The
Learn
dataset provides 3 records and their scoring for
training purposes.
Sleep records are usually stored using European Data Format (EDF)
[4]. The R package edfReader
reads .edf
files. Reading an .edf
file takes
two steps: First reading the headers of the file, then reading the
selected signals. The following spectral analysis will be performed on a
single channel of the EEG, the Fpz-Cz
central
derivation.
library(edfReader)
download.file(
url = "https://sleepdata.org/datasets/learn/files/m/browser/polysomnography/edfs/learn-nsrr01.edf",
destfile = "learn-nsrr01.edf")
<- readEdfHeader("learn-nsrr01.edf")
h
<- readEdfSignals(h) s
The rsleep
function spectrogram()
plots the
spectrogram of the signal. But first, install rsleep
latest
version from Github.
::install_github("boupetch/rsleep")
devtools
library(rsleep)
spectrogram(
signal = s$EEG$signal,
sRate = s$EEG$sRate,
startTime = s$ECG$startTime)
rsleep
reads this particular format with the
read_events_profusion
function. The
plot_hypnogram
function then plots the hypnogram.
if(!file.exists("learn-nsrr01-profusion.xml")){
download.file(
url = "https://sleepdata.org/datasets/learn/files/m/browser/polysomnography/annotations-events-profusion/learn-nsrr01-profusion.xml",
destfile = "learn-nsrr01-profusion.xml")}
<- rsleep::read_events_profusion(
events "learn-nsrr01-profusion.xml", h$startTime)
::plot_hypnogram(events) rsleep
The hypnogram show sleep stages over time using consecutive 30 seconds epochs. Data from the NSRR were manually scored by well-trained technicians according to the American Academy of Sleep Medicine manual [2]. Five sleep stages can be observed:
Visual scoring is an empirical science requiring a considerable amount of knowledge and training. Alternative methods like spectral estimations techniques such as the Fourier transform must be used to quantify information carried in the physiological signals [5].
Epoching is the first step of sleep analysis. Physiological signal, such as EEG, is splitted into consecutive epochs of a discrete duration. Epochs usually start at lights turnoff, when the patient or subject starts the night.
As the example record already has a hynogram, the EEG signal can be
splitted using these scored epochs. The epochs
function
from the rsleep
package split the signal according to these
parameters. It returns a list of signal vectors.
<- epochs(
epochs signals = s$EEG$signal,
sRates = s$EEG$sRate,
epoch = rsleep::hypnogram(events),
startTime = as.numeric(as.POSIXct(h$startTime)))
The Fourier transform (FT) may be the most important function in signal analysis. It decomposes the signal into its constituent frequencies and computes its power spectral densities (PSD). A visual explanation of FT can be found on @jezzamon website: https://www.jezzamon.com/fourier/. However, EEG signals also carry a lot of noise. This noise is easily intereprted by the FT and can jam the results. To solve this problem, Welch’s method split the signal into overlapping segments to average power spectral densities from the Fourier transform.
The pwelch
function rsleep
computes a
periodogram using Welch’s method. The following example computes and
plot the periodogram of the 100th epoch. This epoch has been scored N2,
or light sleep, by the expert.
<- pwelch(epochs[[100]], sRate = s$EEG$sRate) p
summary(p)
#> hz psd
#> Min. : 0.00 Min. :-10.624
#> 1st Qu.:15.62 1st Qu.: -9.458
#> Median :31.25 Median : -6.251
#> Mean :31.25 Mean : -6.480
#> 3rd Qu.:46.88 3rd Qu.: -4.210
#> Max. :62.50 Max. : 0.000
This epoch periodogram shows high PSD in lower frequencies of the
spectrum. As values are normalized using log
, PSD are
negative.
To compute average periodograms by stage, hypnogram and epochs can be
iterated simultaneously using the mapply
function.
Periodograms can be filtered at this step to discard values over 30
Hertz.
<- mapply(x = epochs, y = rsleep::hypnogram(events)$event, FUN = function(x,y){
periodograms <- pwelch(x, sRate = s$EEG$sRate, show = FALSE)
p <- as.data.frame(p[p$hz <= 30,])
p $stage <- y
p
pSIMPLIFY = F) },
mapply
returns a list that can be coerced to a
dataframe
using rbind
combined to
do.call
.
<- do.call("rbind", periodograms) periodograms_df
Once coerced to a dataframe
, raw periodogram values can
be averaged by stage.
<- aggregate(psd ~ hz+stage, periodograms_df, mean) avg_periodograms
Aggregated periodograms can then be plotted using
ggplot2
.
library(ggplot2)
<- c("#F98400","#F2AD00","#00A08A","#FF0000","#5BBCD6")
palette
ggplot(avg_periodograms, aes(x=hz,y=psd,color=stage)) +
geom_line() + theme_bw() +
theme(legend.title = element_blank()) +
scale_colour_manual(name = "stage",
values = palette) +
xlab("Frequency (Hertz)") + ylab("PSD")
Each sleep stage show a distinct average periodogram. If the
N3
stage averages higher PSD values in the lower spectrum,
it show way lower PSD in the upper frequencies compared to other
stages.
The traditional way to simplify the EEG periodogram is to cut the frequencies of the spectrum into bands or ranges [1]:
Delta: Below 3.5
Hertz, the Delta
band is associated with slow-wave sleep in adults subjects.
Theta: Between 3.5
and
7.5
Hertz, the Theta band is associated with drowsiness in
adults and teens subjects.
Alpha: Between 7.5
and
13
Hertz, the Alpha band is associated with a relaxed state
and eyes closed.
Beta: Between 13
and
30
Hertz the Beta band is associated with active thinking,
focus, high alert or anxiousness.
Gamma: Over 30
Hertz the Gamma band
is mostly used for animal EEG analysis.
Bands can be computed using the bands_psd
of the
rsleep
package. Those bands can be normalized by the
spectrum range covered by the bands.
<- lapply(epochs,function(x){
bands bands_psd(
bands = list(c(0.5,3.5), # Delta
c(3.5,7.5), # Theta
c(7.5,13), # Alpha
c(13,30)), # Beta
signal = x, sRate = s$EEG$sRate,
normalize = c(0.5,30))
})
As lapply
returns a list, results must be reshaped in
order to obtain a dataframe object.
<- data.frame(matrix(unlist(bands), nrow=length(bands), byrow=TRUE))
bands_df
colnames(bands_df) <- c("Delta","Theta","Alpha","Beta")
Stages can be retreived from the hypnogram.
$stage <- rsleep::hypnogram(events)$event bands_df
Now that the epochs bands PSD and their corresponding stages are
stored in a dataframe, they can easily be plotted using boxplots from
ggplot2
.
<- reshape2::melt(bands_df, "stage")
bands_df_long
<-c("#F98400", "#F2AD00", "#00A08A", "#FF0000", "#5BBCD6")
palette
ggplot(bands_df_long,
aes(x=stage,y=value,color=stage)) +
geom_boxplot() +
facet_grid(rows = vars(variable),scales = "free") +
scale_colour_manual(name = "stage",
values = palette) +
theme_bw() + xlab("") + ylab("PSD") +
theme(legend.position = "none")
Each stage show a different bands PSD profile. Bands greatly simplify the EEG spectrum.