1 Quasispecies complexity by biodiversity indices

RNA and DNA viruses that replicate by low fidelity polymerases generate a viral quasispecies, a collection of closely related viral genomes.

The high replication error rate that generates this quasispecies is due to a lack of proofreading mechanisms. This feature, in addition to the high replication rate of some viruses, leads to generation of many mutations in each cycle of viral replication.

The complexity of the quasispecies contributes greatly to the adaptive potential of the virus. The complexity of a viral quasispecies can be defined as an intrinsic property that quantifies the diversity and frequency of haplotypes, independently of the population size that contains them. (Gregori et al. 2016) (Gregori et al. 2014)

Quasispecies complexity can explain or predict viral behavior, so it has an obvious interest for clinical purposes. We are often interested in comparing the viral diversity indices between sequential samples from a single patient or between samples from groups of patients. These comparisons can provide information on the patient’s clinical progression or the appropriateness of a given treatment.

QSUtils is a package intended for use with quasispecies amplicon NGS data, but it could also be useful for analyzing 16S/18S ribosomal-based metagenomics or tumor genetic diversity by amplicons.

In this tutorial we illustrate the use of functions contained in the package to compute diversity indices, which can be classified into incidence-based, abundance-based, and functional indices.

#Install package and load data

First, the package should be installed and loaded.

BiocManager::install("QSutils")
## Warning: package(s) not installed when version(s) same as or greater than current; use
##   `force = TRUE` to re-install: 'QSutils'
library(QSutils)

Then, the dataset to work with the diversity indices should be loaded. This vignette deals with the different ways to load data: Simulation vignette for package users is also available.

filepath<-system.file("extdata","ToyData_10_50_1000.fna", package="QSutils")
lst <- ReadAmplSeqs(filepath,type="DNA")
lst
## $nr
##  [1] 464  62  39  27  37  16  33  54 248  20
## 
## $hseqs
## DNAStringSet object of length 10:
##      width seq                                              names               
##  [1]    50 CACCCTGTGACCAGTGTGTGCGA...GTGCCCCGTTGGCATTGACTAT Hpl_0_0001|464|46.4
##  [2]    50 CACTCTGTGACCAGTGTGTGCGA...GTGCCCCGTTGGCATTGACTAT Hpl_1_0001|62|6.2
##  [3]    50 CACCCTGTGACCAGCGTGTGCGA...GTGCCCCGTTGGCATTGACTAT Hpl_1_0002|39|3.9
##  [4]    50 CACCCTGTGACCAGTGTGTGCGA...GTGCCCCGTTGGCATTGACTAC Hpl_1_0003|27|2.7
##  [5]    50 CACTCTGTGACCAGTGTGTGCGA...GTGCCCCGTTAGCATTGACTAT Hpl_2_0001|37|3.7
##  [6]    50 CACTCGGTGACCAGTGTGCGTGA...GTGCCCCGTTGGCATTGACTAT Hpl_4_0001|16|1.6
##  [7]    50 CACTCTGTGACCAGTGTGCGCGA...GTGCCCTGTCGGCATTGACTAT Hpl_5_0001|33|3.3
##  [8]    50 CACTCTGTGATCAGTGTGCGCGA...GTGCCCTGCCGGCATCGACTAT Hpl_8_0001|54|5.4
##  [9]    50 CACTCTGTGATCAGTGTGCGCGA...GTGCCCTGCCGGCATCGACTAC Hpl_9_0001|248|24.8
## [10]    50 CACTCTGTGATCAGTGTGCGCGA...GTGCCCTGCCGGCACCGACTAC Hpl_10_0001|20|2

2 Incidence-based diversity indices or richness indices

Incidence-based diversity indices correspond to the number of observed entities, regardless of their abundances. The main incidence indices are the number of haplotypes, the number of polymorphic sites, and the number of mutations. These indices can be computed as follows:

  • number of haplotypes

    length(lst$hseqs)
    ## [1] 10

    In this fasta file, 10 haplotypes are reported. This can be calculated with the length of the DNAStringSet object.

  • The number of polymorphic sites

    SegSites(lst$hseqs)
    ## [1] 14

    In this example, there are 14 polymorphic sites; that is, mutated positions with respect to the dominant haplotype.

  • Number of mutations

    TotalMutations(lst$hseqs)
    ## [1] 37

    Returns the total number of mutations observed in the alignment.

3 Abundance-based diversity indices

Abundance-based diversity indices take into account the entities present and their relative abundance in the population.

  • Shannon entropy

    Shannon(lst$nr)
    ## [1] 1.6396
    NormShannon(lst$nr)
    ## [1] 0.7120691

    Shannon entropy is a measure of uncertainty. This index varies from 0, when there is a single haplotype, to the logarithm of the number of haplotypes. It represents the uncertainty in assigning a random genome to the corresponding haplotype in the population studied. This index is commonly used in the normalized form, although the non-normalized form is recommended. The normalized form constitutes a measure of evenness rather than diversity.

    The variance of Shannon entropy and normalized Shannon entropy can be computed with:

    ShannonVar(lst$nr)
    ## [1] 0.001154642
    NormShannonVar(lst$nr)
    ## [1] 0.000217779
  • Gini-Simpson

    GiniSimpson(lst$nr)
    ## [1] 0.7117878
    GiniSimpsonMVUE(lst$nr)
    ## [1] 0.7117878

    The Gini-Simpson index expresses the probability that two randomly sampled molecules from the viral population correspond to different haplotypes. It has a range of variation from 0, when there is a single haplotype, to 1 (asymptotically), when there are an infinity of equally abundant haplotypes. Interpretation of this index is clearer and more intuitive than that of Shannon entropy, and it is scarcely sensitive to rare haplotypes, as it gives higher weight to the more abundant variants.

    The variance of the Gini-Simpson index is obtained with:

    GiniSimpsonVar(lst$nr)
    ## [1] 0.0128987
  • Hill numbers

    Although Shannon entropy, the Gini-Simpson index, and many other reported indices are considered measures of diversity, their units do not allow an easily interpreted and intuitive measure of true diversity. They are not linear with respect to the addition of new haplotypes, and they tend to saturate: the larger the number of haplotypes, the less sensitive they are to frequency changes. In contrast, Hill numbers are a generalization of diversity measures in units of equally abundant species.

    Hill(lst$nr,q=1)
    ## [1] 5.153107

    Hill function computes the Hill number for a given order, q, but in QSutils there is a wrapper function that computes a profile of Hill numbers for different q values, so that one can see what happens when q increases in a plot.

    HillProfile(lst$nr)
    plot(HillProfile(lst$nr),type ="b", main="Hill numbers obtained
        with HillProfile")
    ##        q        qD
    ## 1   0.00 10.000000
    ## 2   0.10  9.364553
    ## 3   0.20  8.751454
    ## 4   0.30  8.166229
    ## 5   0.40  7.613843
    ## 6   0.50  7.098360
    ## 7   0.60  6.622668
    ## 8   0.70  6.188332
    ## 9   0.80  5.795587
    ## 10  0.90  5.443454
    ## 11  1.00  5.153107
    ## 12  1.20  4.607768
    ## 13  1.40  4.203660
    ## 14  1.60  3.891941
    ## 15  1.80  3.650325
    ## 16  2.00  3.461118
    ## 17  2.25  3.278284
    ## 18  2.50  3.138087
    ## 19  2.75  3.028004
    ## 20  3.00  2.939603
    ## 21  3.25  2.867153
    ## 22  3.50  2.806698
    ## 23  3.75  2.755460
    ## 24  4.00  2.711447
    ## 25  5.00  2.583506
    ## 26  6.00  2.501359
    ## 27  7.00  2.444364
    ## 28  8.00  2.402760
    ## 29  9.00  2.371234
    ## 30 10.00  2.346626
    ## 31   Inf  2.155172
Hill numbers profile

Figure 1: Hill numbers profile

As the order of the Hill number increases, the measure of diversity becomes less sensitive to rare haplotypes. Note that the Hill number of order q=0 is simply the number of haplotypes. For q=1 the Hill number is undefined, but as approaches 1 it tends to the exponential of Shannon entropy. For q=2 the Hill number corresponds to the inverse of the Simpson index and for q=Inf it is the inverse of the relative abundance of the rarest haplotype.

  • Rényi entropy

    Renyi(lst$nr,q=3)
    ## [1] 1.078274

    Rényi entropy is a log transformation of the Hill numbers.

    RenyiProfile(lst$nr)
    plot(RenyiProfile(lst$nr),type ="b", main="Rényi entropy obtained with
        RenyiProfile")
    ##        q     renyi
    ## 1   0.00 2.3025851
    ## 2   0.10 2.2369316
    ## 3   0.20 2.1692199
    ## 4   0.30 2.1000072
    ## 5   0.40 2.0299680
    ## 6   0.50 1.9598637
    ## 7   0.60 1.8904982
    ## 8   0.70 1.8226656
    ## 9   0.80 1.7570967
    ## 10  0.90 1.6944139
    ## 11  1.00 1.6395998
    ## 12  1.20 1.5277437
    ## 13  1.40 1.4359555
    ## 14  1.60 1.3589079
    ## 15  1.80 1.2948162
    ## 16  2.00 1.2415916
    ## 17  2.25 1.1873200
    ## 18  2.50 1.1436134
    ## 19  2.75 1.1079036
    ## 20  3.00 1.0782744
    ## 21  3.25 1.0533194
    ## 22  3.50 1.0320087
    ## 23  3.75 1.0135843
    ## 24  4.00 0.9974824
    ## 25  5.00 0.9491472
    ## 26  6.00 0.9168340
    ## 27  7.00 0.8937851
    ## 28  8.00 0.8766183
    ## 29  9.00 0.8634104
    ## 30 10.00 0.8529785
    ## 31   Inf 0.7678707