This vignette describes the Stop-Signal Reaction Time integration method (SSRTi); a scoring method introduced by Logan (1981). The scoring function was adapted from an R-script that was graciously made available by Craig Hedge and used in Hedge, Powell, and Sumner (2018).
Load the included SST dataset and inspect its documentation.
data("ds_sst", package = "splithalfr")
?ds_sst
The columns used in this example are:
Drop the first trial of each block.
ds_sst <- ds_sst[ds_sst$trial > 1, ]
The variable condition
was counterbalanced. Below we
illustrate this for the first participant.
ds_1 <- subset(ds_sst, participant == 1)
table(ds_1$condition)
The scoring function receives the data from a single participant. The mean SSD is subtracted from the nth fastest RT, where n corresponds to the percentage of stop trials on which participants failed to inhibit their responses.
fn_score <- function(ds) {
# Mean SSD
mean_ssd <- mean(ds[ds$condition == 1, ]$ssd)
# Proportion of failed nogos
p_failed_nogo <- 1 - mean(ds[ds$condition == 1, ]$response)
# Go RTs
go_rts <- ds[
ds$condition == 0 &
ds$rt > 0,
]$rt
# n-th percentile of Go RTs
rt_quantile <- quantile(go_rts, p_failed_nogo, names = FALSE)
# SSRTi
return(rt_quantile - mean_ssd)
}
Let’s calculate the SSRTi score for the participant with UserID 1.
fn_score(subset(ds_sst, participant == 1))
To calculate the SSRTi score for each participant, we will use R’s
native by
function and convert the result to a data
frame.
scores <- by(
ds_sst,
ds_sst$participant,
fn_score
)
data.frame(
participant = names(scores),
score = as.vector(scores)
)
To calculate split-half scores for each participant, use the function
by_split
. The first three arguments of this function are
the same as for by
. An additional set of arguments allow
you to specify how to split the data and how often. In this vignette we
will calculate scores of 1000 permutated splits. The trial properties
condition
and stim
were counterbalanced in the
Go/No Go design. We will stratify splits by these trial properties. See
the vignette on splitting methods for more ways to split the data.
The by_split
function returns a data frame with the
following columns:
participant
, which identifies participantsreplication
, which counts replicationsscore_1
and score_2
, which are the scores
calculated for each of the split datasetsCalculating the split scores may take a while. By default,
by_split
uses all available CPU cores, but no progress bar
is displayed. Setting ncores = 1
will display a progress
bar, but processing will be slower.
split_scores <- by_split(
ds_sst,
ds_sst$participant,
fn_score,
replications = 1000,
stratification = ds_sst$condition,
)
Next, the output of by_split
can be analyzed in order to
estimate reliability. By default, functions are provided that calculate
Spearman-Brown adjusted Pearson correlations
(spearman_brown
), Flanagan-Rulon
(flanagan_rulon
), Angoff-Feldt (angoff_feldt
),
and Intraclass Correlation (short_icc
) coefficients. Each
of these coefficient functions can be used with split_coef
to calculate the corresponding coefficients per split, which can then be
plotted or averaged via a simple mean
. A bias-corrected and
accelerated bootstrap confidence interval can be calculated via
split_ci
. Note that estimating the confidence interval
involves very intensive calculations, so it can take a long time to
complete.
# Spearman-Brown adjusted Pearson correlations per replication
coefs <- split_coefs(split_scores, spearman_brown)
# Distribution of coefficients
hist(coefs)
# Mean of coefficients
mean(coefs)
# Confidence interval of coefficients
split_ci(split_scores, spearman_brown)