Reimplement correlation with matrix based approach

This commit is contained in:
Elias Projahn 2021-10-20 11:09:37 +02:00
parent e6bca4d515
commit 0eac84377d

View file

@ -1,79 +1,73 @@
# Compute the mean correlation coefficient comparing gene distances with a set # Compute the mean correlation coefficient comparing gene distances with a set
# of reference genes. # of reference genes.
correlation <- function(distances, preset, progress = NULL) { correlation <- function(distances, preset, progress = NULL) {
results <- data.table(gene = preset$gene_ids) species_ids <- preset$species_ids
gene_ids <- preset$gene_ids
reference_gene_ids <- preset$reference_gene_ids reference_gene_ids <- preset$reference_gene_ids
reference_count <- length(reference_gene_ids)
# Prefilter distances by species. # Prefilter distances by species.
distances <- distances[species %chin% preset$species_ids] distances <- distances[species %chin% species_ids]
# Add an index for quickly accessing data per gene. # Tranform data to get species as rows and genes as columns. We construct
setkey(distances, gene) # columns per species, because it requires fewer iterations, and transpose
# the table afterwards.
# Prepare the reference genes' data. data <- data.table(gene = gene_ids)
reference_distances <- distances[gene %chin% reference_gene_ids]
genes_done <- 0 # Make a column containing distance data for each species.
genes_total <- length(preset$gene_ids) for (species_id in species_ids) {
species_distances <- distances[species == species_id, .(gene, distance)]
data <- merge(data, species_distances, all.x = TRUE)
setnames(data, "distance", species_id)
}
# Perform the correlation for one gene. # Transpose to the desired format.
compute <- function(gene_id) { data <- transpose(data, make.names = "gene")
gene_distances <- distances[gene_id]
gene_species_count <- nrow(gene_distances)
# Return a score of 0.0 if there is just one or no value at all. if (!is.null(progress)) progress(0.33)
if (gene_species_count <= 1) {
return(0.0)
}
# Buffer for the sum of correlation coefficients. # Take the reference data.
correlation_sum <- 0 reference_data <- data[, ..reference_gene_ids]
# Correlate with all reference genes but not with the gene itself. # Perform the correlation between all possible pairs.
gene_reference_gene_ids <- reference_gene_ids[ results <- stats::cor(
reference_gene_ids != gene_id data[, ..gene_ids],
] reference_data,
use = "pairwise.complete.obs",
method = "spearman"
)
for (reference_gene_id in gene_reference_gene_ids) { results <- data.table(results, keep.rownames = TRUE)
data <- merge( setnames(results, "rn", "gene")
gene_distances,
reference_distances[reference_gene_id],
by = "species"
)
# Skip this reference gene, if there are not enough value pairs. # Remove correlations between the reference genes themselves.
# This will lessen the final score, because it effectively for (reference_gene_id in reference_gene_ids) {
# represents a correlation coefficient of 0.0. column <- quote(reference_gene_id)
if (nrow(data) <= 1) { results[gene == reference_gene_id, eval(column) := NA]
next }
}
# Order data by the reference gene's distance to get a monotonic if (!is.null(progress)) progress(0.66)
# relation.
setorder(data, distance.y)
correlation <- abs(stats::cor( # Compute the final score as the mean of known correlation scores. Negative
data[, distance.x], data[, distance.y], # correlations will correctly lessen the score, which will be clamped to
method = "spearman" # zero as its lower bound. Genes with no possible correlations at all will
)) # be assumed to have a score of 0.0.
# If the correlation is NA, this will effectively mean 0.0. compute_score <- function(scores) {
if (!is.na(correlation)) { score <- mean(scores, na.rm = TRUE)
correlation_sum <- correlation_sum + correlation
}
}
# Compute the score as the mean correlation coefficient. if (is.na(score) | score < 0.0) {
score <- correlation_sum / length(gene_reference_gene_ids) score <- 0.0
if (!is.null(progress)) {
genes_done <<- genes_done + 1
progress(genes_done / genes_total)
} }
score score
} }
results[, score := compute(gene), by = 1:nrow(results)] results[,
score := compute_score(as.matrix(.SD)),
.SDcols = reference_gene_ids,
by = gene
]
results[, .(gene, score)]
} }