This vignette briefly recaps the main concepts of QFeatures on which scp relies. More in depth information is to be found in the QFeatures vignettes.

1 The QFeatures class

The QFeatures class is based on the MultiAssayExperiment class that holds a collection of SummarizedExperiment (or other classes that inherits from it) objects termed assays. The assays in a QFeatures object have a hierarchical relation: proteins are composed of peptides, themselves produced by spectra, as depicted in figure below.

Those links are stored as part as the QFeatures object and connect the assays together. We load an example dataset from the scp package that is formatted as an QFeatures object and plot those connection.

library(scp)
data("scp1")
plot(scp1)

2 Accessing the data

The QFeatures class contains all the available and metadata. We here show how to retrieve those different pieces of information.

2.1 Quantitative data

The quantitative data, stored as matrix-like objects, can be accessed using the assay function. For example, we here extract the quantitative data for the first MS batch (and show a subset of it):

assay(scp1, "190321S_LCA10_X_FP97AG")[1:5, ]
#>          190321S_LCA10_X_FP97AG_RI1 190321S_LCA10_X_FP97AG_RI2
#> PSM3773                       57895                     603.73
#> PSM9078                       64889                    1481.30
#> PSM9858                       58993                     489.85
#> PSM11744                      75711                     539.02
#> PSM21752                          0                       0.00
#>          190321S_LCA10_X_FP97AG_RI3 190321S_LCA10_X_FP97AG_RI4
#> PSM3773                      2787.9                     757.17
#> PSM9078                      4891.6                     597.53
#> PSM9858                      2899.4                     882.37
#> PSM11744                     7292.7                     357.90
#> PSM21752                        0.0                       0.00
#>          190321S_LCA10_X_FP97AG_RI5 190321S_LCA10_X_FP97AG_RI6
#> PSM3773                      862.08                    1118.80
#> PSM9078                     1140.30                    1300.10
#> PSM9858                      296.60                     977.15
#> PSM11744                    1091.30                     736.87
#> PSM21752                       0.00                       0.00
#>          190321S_LCA10_X_FP97AG_RI7 190321S_LCA10_X_FP97AG_RI8
#> PSM3773                      640.10                    1446.10
#> PSM9078                     1092.50                    1309.40
#> PSM9858                      498.60                    1437.90
#> PSM11744                     712.74                     590.75
#> PSM21752                       0.00                       0.00
#>          190321S_LCA10_X_FP97AG_RI9 190321S_LCA10_X_FP97AG_RI10
#> PSM3773                      968.49                      648.56
#> PSM9078                     1538.40                     1014.50
#> PSM9858                      857.40                      888.01
#> PSM11744                   15623.00                      298.60
#> PSM21752                       0.00                        0.00
#>          190321S_LCA10_X_FP97AG_RI11
#> PSM3773                       742.53
#> PSM9078                      1062.80
#> PSM9858                       768.61
#> PSM11744                      481.38
#> PSM21752                        0.00

Note that you can retrieve the list of available assays in a QFeatures object using the names() function.

names(scp1)
#> [1] "190321S_LCA10_X_FP97AG"       "190222S_LCA9_X_FP94BM"       
#> [3] "190914S_LCB3_X_16plex_Set_21" "peptides"                    
#> [5] "proteins"

2.2 Feature metadata

For each individual assay, there is feature metadata available. We extract the list of metadata tables by using rowData() on the QFeatures object.

rowData(scp1)
#> DataFrameList of length 5
#> names(5): 190321S_LCA10_X_FP97AG 190222S_LCA9_X_FP94BM 190914S_LCB3_X_16plex_Set_21 peptides proteins
rowData(scp1)[["proteins"]]
#> DataFrame with 292 rows and 9 columns
#>                                            protein Match.time.difference
#>                                        <character>             <logical>
#> A1A519                                      A1A519                    NA
#> A5D8V6                                      A5D8V6                    NA
#> A5PLK6                                      A5PLK6                    NA
#> A5PLL1                                      A5PLL1                    NA
#> A6NC97                                      A6NC97                    NA
#> ...                                            ...                   ...
#> REV__CON__ENSEMBL:ENSBTAP00000038253 REV__CON__...                    NA
#> REV__CON__P06868                     REV__CON__...                    NA
#> REV__CON__Q05443                     REV__CON__...                    NA
#> REV__CON__Q32PI4                     REV__CON__...                    NA
#> REV__CON__Q3MHN5                     REV__CON__...                    NA
#>                                      Match.m.z.difference Match.q.value
#>                                                 <logical>     <logical>
#> A1A519                                                 NA            NA
#> A5D8V6                                                 NA            NA
#> A5PLK6                                                 NA            NA
#> A5PLL1                                                 NA            NA
#> A6NC97                                                 NA            NA
#> ...                                                   ...           ...
#> REV__CON__ENSEMBL:ENSBTAP00000038253                   NA            NA
#> REV__CON__P06868                                       NA            NA
#> REV__CON__Q05443                                       NA            NA
#> REV__CON__Q32PI4                                       NA            NA
#> REV__CON__Q3MHN5                                       NA            NA
#>                                      Match.score Reporter.PIF Reporter.fraction
#>                                        <logical>    <logical>         <logical>
#> A1A519                                        NA           NA                NA
#> A5D8V6                                        NA           NA                NA
#> A5PLK6                                        NA           NA                NA
#> A5PLL1                                        NA           NA                NA
#> A6NC97                                        NA           NA                NA
#> ...                                          ...          ...               ...
#> REV__CON__ENSEMBL:ENSBTAP00000038253          NA           NA                NA
#> REV__CON__P06868                              NA           NA                NA
#> REV__CON__Q05443                              NA           NA                NA
#> REV__CON__Q32PI4                              NA           NA                NA
#> REV__CON__Q3MHN5                              NA           NA                NA
#>                                      Potential.contaminant        .n
#>                                                <character> <integer>
#> A1A519                                                             1
#> A5D8V6                                                             1
#> A5PLK6                                                             1
#> A5PLL1                                                             1
#> A6NC97                                                             1
#> ...                                                    ...       ...
#> REV__CON__ENSEMBL:ENSBTAP00000038253                     +         1
#> REV__CON__P06868                                         +         1
#> REV__CON__Q05443                                         +         1
#> REV__CON__Q32PI4                                         +         1
#> REV__CON__Q3MHN5                                         +         1

You can also retrieve the names of each rowData column for all assays with rowDataNames.

rowDataNames(scp1)
#> CharacterList of length 5
#> [["190321S_LCA10_X_FP97AG"]] uid Sequence ... peptide Leading.razor.protein
#> [["190222S_LCA9_X_FP94BM"]] uid Sequence ... peptide Leading.razor.protein
#> [["190914S_LCB3_X_16plex_Set_21"]] uid Sequence ... Leading.razor.protein
#> [["peptides"]] Sequence Length Modifications ... .n Leading.razor.protein
#> [["proteins"]] protein Match.time.difference ... Potential.contaminant .n

You can also get the rowData from different assays in a single table using the rbindRowData function. It will keep the common rowData variables to all selected assays (provided through i).

rbindRowData(scp1, i = 1:5)
#> DataFrame with 1388 rows and 10 columns
#>              assay       rowname       protein Match.time.difference
#>        <character>   <character>   <character>             <logical>
#> 1    190321S_LC...       PSM3773        P61981                    NA
#> 2    190321S_LC...       PSM9078        Q8WVN8                    NA
#> 3    190321S_LC...       PSM9858        P55084                    NA
#> 4    190321S_LC...      PSM11744        P19099                    NA
#> 5    190321S_LC...      PSM21752        P52952                    NA
#> ...            ...           ...           ...                   ...
#> 1384      proteins REV__CON__... REV__CON__...                    NA
#> 1385      proteins REV__CON__... REV__CON__...                    NA
#> 1386      proteins REV__CON__... REV__CON__...                    NA
#> 1387      proteins REV__CON__... REV__CON__...                    NA
#> 1388      proteins REV__CON__... REV__CON__...                    NA
#>      Match.m.z.difference Match.q.value Match.score Reporter.PIF
#>                 <logical>     <logical>   <logical>    <logical>
#> 1                      NA            NA          NA           NA
#> 2                      NA            NA          NA           NA
#> 3                      NA            NA          NA           NA
#> 4                      NA            NA          NA           NA
#> 5                      NA            NA          NA           NA
#> ...                   ...           ...         ...          ...
#> 1384                   NA            NA          NA           NA
#> 1385                   NA            NA          NA           NA
#> 1386                   NA            NA          NA           NA
#> 1387                   NA            NA          NA           NA
#> 1388                   NA            NA          NA           NA
#>      Reporter.fraction Potential.contaminant
#>              <logical>           <character>
#> 1                   NA                      
#> 2                   NA                      
#> 3                   NA                      
#> 4                   NA                      
#> 5                   NA                      
#> ...                ...                   ...
#> 1384                NA                     +
#> 1385                NA                     +
#> 1386                NA                     +
#> 1387                NA                     +
#> 1388                NA                     +

2.3 Sample metadata

The sample metadata is retrieved using colData on the QFeatures object.

colData(scp1)
#> DataFrame with 38 rows and 7 columns
#>                                             Set     Channel SampleAnnotation
#>                                     <character> <character>      <character>
#> 190222S_LCA9_X_FP94BM_RI1         190222S_LC...         RI1    carrier_mi...
#> 190222S_LCA9_X_FP94BM_RI2         190222S_LC...         RI2             norm
#> 190222S_LCA9_X_FP94BM_RI3         190222S_LC...         RI3           unused
#> 190222S_LCA9_X_FP94BM_RI4         190222S_LC...         RI4             sc_u
#> 190222S_LCA9_X_FP94BM_RI5         190222S_LC...         RI5             sc_0
#> ...                                         ...         ...              ...
#> 190914S_LCB3_X_16plex_Set_21_RI12 190914S_LC...        RI12            sc_m0
#> 190914S_LCB3_X_16plex_Set_21_RI13 190914S_LC...        RI13            sc_m0
#> 190914S_LCB3_X_16plex_Set_21_RI14 190914S_LC...        RI14            sc_m0
#> 190914S_LCB3_X_16plex_Set_21_RI15 190914S_LC...        RI15            sc_m0
#> 190914S_LCB3_X_16plex_Set_21_RI16 190914S_LC...        RI16            sc_m0
#>                                    SampleType     lcbatch     sortday
#>                                   <character> <character> <character>
#> 190222S_LCA9_X_FP94BM_RI1             Carrier        LCA9          s8
#> 190222S_LCA9_X_FP94BM_RI2           Reference        LCA9          s8
#> 190222S_LCA9_X_FP94BM_RI3              Unused        LCA9          s8
#> 190222S_LCA9_X_FP94BM_RI4            Monocyte        LCA9          s8
#> 190222S_LCA9_X_FP94BM_RI5               Blank        LCA9          s8
#> ...                                       ...         ...         ...
#> 190914S_LCB3_X_16plex_Set_21_RI12  Macrophage        LCB3          s9
#> 190914S_LCB3_X_16plex_Set_21_RI13  Macrophage        LCB3          s9
#> 190914S_LCB3_X_16plex_Set_21_RI14  Macrophage        LCB3          s9
#> 190914S_LCB3_X_16plex_Set_21_RI15  Macrophage        LCB3          s9
#> 190914S_LCB3_X_16plex_Set_21_RI16  Macrophage        LCB3          s9
#>                                        digest
#>                                   <character>
#> 190222S_LCA9_X_FP94BM_RI1                   N
#> 190222S_LCA9_X_FP94BM_RI2                   N
#> 190222S_LCA9_X_FP94BM_RI3                   N
#> 190222S_LCA9_X_FP94BM_RI4                   N
#> 190222S_LCA9_X_FP94BM_RI5                   N
#> ...                                       ...
#> 190914S_LCB3_X_16plex_Set_21_RI12           R
#> 190914S_LCB3_X_16plex_Set_21_RI13           R
#> 190914S_LCB3_X_16plex_Set_21_RI14           R
#> 190914S_LCB3_X_16plex_Set_21_RI15           R
#> 190914S_LCB3_X_16plex_Set_21_RI16           R

Note that you can easily access a colData column using the $ operator. See here how we extract the sample types from the colData.

scp1$SampleType
#>  [1] "Carrier"    "Reference"  "Unused"     "Monocyte"   "Blank"     
#>  [6] "Monocyte"   "Macrophage" "Macrophage" "Macrophage" "Macrophage"
#> [11] "Macrophage" "Carrier"    "Reference"  "Unused"     "Macrophage"
#> [16] "Monocyte"   "Macrophage" "Macrophage" "Macrophage" "Macrophage"
#> [21] "Macrophage" "Macrophage" "Carrier"    "Reference"  "Unused"    
#> [26] "Unused"     "Macrophage" "Macrophage" "Blank"      "Monocyte"  
#> [31] "Macrophage" "Monocyte"   "Blank"      "Macrophage" "Macrophage"
#> [36] "Macrophage" "Macrophage" "Macrophage"

3 Subsetting the data

There are three dimensions we want to subset for:

  • Assays
  • Samples
  • Features

Therefore, QFeatures support a three-index subsetting. This is performed through the simple bracket method [feature, sample, assay].

3.1 Subset assays

Suppose that we want to focus only on the first MS batch (190321S_LCA10_X_FP97AG) for separate processing of the data. Subsetting the QFeatures object for that assay is simply:

scp1[, , "190321S_LCA10_X_FP97AG"]
#> Warning: 'experiments' dropped; see 'metadata'
#> harmonizing input:
#>   removing 103 sampleMap rows not in names(experiments)
#>   removing 27 colData rownames not in sampleMap 'primary'
#> An instance of class QFeatures containing 1 assays:
#>  [1] 190321S_LCA10_X_FP97AG: SingleCellExperiment with 166 rows and 11 columns

An alternative that results in exactly the same output is using the subsetByAssay method.

subsetByAssay(scp1, "190321S_LCA10_X_FP97AG")
#> Warning: 'experiments' dropped; see 'metadata'
#> harmonizing input:
#>   removing 103 sampleMap rows not in names(experiments)
#>   removing 27 colData rownames not in sampleMap 'primary'
#> An instance of class QFeatures containing 1 assays:
#>  [1] 190321S_LCA10_X_FP97AG: SingleCellExperiment with 166 rows and 11 columns

3.2 Subset samples

Subsetting samples is often performed after sample QC where we want to keep only quality samples and sample of interest. In our example, the different samples are either technical controls or single-cells (macrophages and monocytes). Suppose we are only interested in macrophages, we can subset the data as follows:

scp1[, scp1$SampleType == "Macrophage", ]
#> An instance of class QFeatures containing 5 assays:
#>  [1] 190321S_LCA10_X_FP97AG: SingleCellExperiment with 166 rows and 7 columns 
#>  [2] 190222S_LCA9_X_FP94BM: SingleCellExperiment with 176 rows and 5 columns 
#>  [3] 190914S_LCB3_X_16plex_Set_21: SingleCellExperiment with 215 rows and 8 columns 
#>  [4] peptides: SingleCellExperiment with 539 rows and 20 columns 
#>  [5] proteins: SingleCellExperiment with 292 rows and 20 columns

An alternative that results in exactly the same output is using the subsetByColData method.

subsetByColData(scp1, scp1$SampleType == "Macrophage")
#> An instance of class QFeatures containing 5 assays:
#>  [1] 190321S_LCA10_X_FP97AG: SingleCellExperiment with 166 rows and 7 columns 
#>  [2] 190222S_LCA9_X_FP94BM: SingleCellExperiment with 176 rows and 5 columns 
#>  [3] 190914S_LCB3_X_16plex_Set_21: SingleCellExperiment with 215 rows and 8 columns 
#>  [4] peptides: SingleCellExperiment with 539 rows and 20 columns 
#>  [5] proteins: SingleCellExperiment with 292 rows and 20 columns

3.3 Subset features

Subsetting for features does more than simply subsetting for the features of interest, it will also take the features that are linked to that feature. Here is an example, suppose we are interested in the Q02878 protein.

scp1["Q02878", , ]
#> An instance of class QFeatures containing 5 assays:
#>  [1] 190321S_LCA10_X_FP97AG: SingleCellExperiment with 9 rows and 11 columns 
#>  [2] 190222S_LCA9_X_FP94BM: SingleCellExperiment with 10 rows and 11 columns 
#>  [3] 190914S_LCB3_X_16plex_Set_21: SingleCellExperiment with 0 rows and 16 columns 
#>  [4] peptides: SingleCellExperiment with 11 rows and 38 columns 
#>  [5] proteins: SingleCellExperiment with 1 rows and 38 columns

You can see it indeed retrieved that protein from the proteins assay, but it also retrieved 11 associated peptides in the peptides assay and 19 associated PSMs in 2 different MS runs.

An alternative that results in exactly the same output is using the subsetByColData method.

subsetByFeature(scp1, "Q02878")
#> An instance of class QFeatures containing 5 assays:
#>  [1] 190321S_LCA10_X_FP97AG: SingleCellExperiment with 9 rows and 11 columns 
#>  [2] 190222S_LCA9_X_FP94BM: SingleCellExperiment with 10 rows and 11 columns 
#>  [3] 190914S_LCB3_X_16plex_Set_21: SingleCellExperiment with 0 rows and 16 columns 
#>  [4] peptides: SingleCellExperiment with 11 rows and 38 columns 
#>  [5] proteins: SingleCellExperiment with 1 rows and 38 columns

You can also subset features based on the rowData. This is performed by filterFeatures. For example, we want to remove features that are associated to reverse sequence hits.

filterFeatures(scp1, ~ Reverse != "+")
#> An instance of class QFeatures containing 5 assays:
#>  [1] 190321S_LCA10_X_FP97AG: SingleCellExperiment with 126 rows and 11 columns 
#>  [2] 190222S_LCA9_X_FP94BM: SingleCellExperiment with 132 rows and 11 columns 
#>  [3] 190914S_LCB3_X_16plex_Set_21: SingleCellExperiment with 176 rows and 16 columns 
#>  [4] peptides: SingleCellExperiment with 422 rows and 38 columns 
#>  [5] proteins: SingleCellExperiment with 0 rows and 38 columns

Note however that if an assay is missing the variable that is used to filter the data (in this case the proteins assay), then all features for that assay are removed.

You can also subset the data based on the feature missingness using filterNA. In this example, we filter out proteins with more than 70 % missing data.

filterNA(scp1, i = "proteins", pNA = 0.7)
#> An instance of class QFeatures containing 5 assays:
#>  [1] 190321S_LCA10_X_FP97AG: SingleCellExperiment with 166 rows and 11 columns 
#>  [2] 190222S_LCA9_X_FP94BM: SingleCellExperiment with 176 rows and 11 columns 
#>  [3] 190914S_LCB3_X_16plex_Set_21: SingleCellExperiment with 215 rows and 16 columns 
#>  [4] peptides: SingleCellExperiment with 539 rows and 38 columns 
#>  [5] proteins: SingleCellExperiment with 105 rows and 38 columns

4 Common processing steps

We here provide a list of common processing steps that are encountered in single-cell proteomics data processing and that are already available in the QFeatures package.

All functions below require the user to select one or more assays from the QFeatures object. This is passed through the i argument. Note that some datasets may contain hundreds of assays and providing the assay selection manually can become cumbersome. We therefore suggest the user to use regular expression (aka regex) to chose from the names() of the QFeautres object. A detailed cheatsheet about regex in R can be found here.

4.1 Missing data assignment

It often occurs that in MS experiements, 0 values are not true zeros but rather signal that is too weak to be detected. Therefore, it is advised to consider 0 values as missing data (NA). You can use zeroIsNa to automatically convert 0 values to NA in assays of interest. For instance, we here replace missing data in the peptides assay.

table(assay(scp1, "peptides") == 0)
#> 
#> FALSE  TRUE 
#>  5611  1509
scp1 <-zeroIsNA(scp1, "peptides")
table(assay(scp1, "peptides") == 0)
#> 
#> FALSE 
#>  5611

4.2 Feature aggregation

Shotgun proteomics analyses, bulk as well as single-cell, acquire and quantify peptides. However, biological inference is often performed at protein level. Protein quantitations can be estimated through feature aggregation. This is performed by aggregateFeatures, a function that takes an assay from the Qfeatures object and that aggregates its features with respect to a grouping variable in the rowData (fcol) and an aggregation function.

aggregateFeatures(scp1, i = "190321S_LCA10_X_FP97AG", fcol = "protein",
                  name = "190321S_LCA10_X_FP97AG_aggr", 
                  fun = MsCoreUtils::robustSummary)
#> Your row data contain missing values. Please read the relevant
#> section(s) in the aggregateFeatures manual page regarding the effects
#> of missing values on data aggregation.
#> Warning in rlm.default(X, expression, ...): 'rlm' failed to converge in 20 steps
#> Warning: The dim() method for DataFrameList objects is deprecated. Please use
#>   dims() on these objects instead.
#> Warning: The nrow() method for DataFrameList objects is deprecated. Please use
#>   nrows() on these objects instead.
#> Warning: The ncol() method for CompressedSplitDataFrameList objects is
#>   deprecated. Please use ncols() on these objects instead.
#> An instance of class QFeatures containing 6 assays:
#>  [1] 190321S_LCA10_X_FP97AG: SingleCellExperiment with 166 rows and 11 columns 
#>  [2] 190222S_LCA9_X_FP94BM: SingleCellExperiment with 176 rows and 11 columns 
#>  [3] 190914S_LCB3_X_16plex_Set_21: SingleCellExperiment with 215 rows and 16 columns 
#>  [4] peptides: SingleCellExperiment with 539 rows and 38 columns 
#>  [5] proteins: SingleCellExperiment with 292 rows and 38 columns 
#>  [6] 190321S_LCA10_X_FP97AG_aggr: SingleCellExperiment with 100 rows and 11 columns

You can see that the aggregated function is added as a new assay to the QFeatures object. Note also that, under the hood, aggregateFeatures keeps track of the relationship between the features of the newly aggregated assay and its parent.

4.3 Normalization

An ubiquituous step that is performed in biological data analysis is normalization that is meant to remove undesired variability and to make different samples comparable. The normalize function offers an interface to a wide variety of normalization methods. See ?MsCoreUtils::normalize_matrix for more details about the available normalization methods. Below, we normalize the samples so that they are mean centered.

normalize(scp1, "proteins", method = "center.mean", 
          name = "proteins_mcenter")
#> An instance of class QFeatures containing 6 assays:
#>  [1] 190321S_LCA10_X_FP97AG: SingleCellExperiment with 166 rows and 11 columns 
#>  [2] 190222S_LCA9_X_FP94BM: SingleCellExperiment with 176 rows and 11 columns 
#>  [3] 190914S_LCB3_X_16plex_Set_21: SingleCellExperiment with 215 rows and 16 columns 
#>  [4] peptides: SingleCellExperiment with 539 rows and 38 columns 
#>  [5] proteins: SingleCellExperiment with 292 rows and 38 columns 
#>  [6] proteins_mcenter: SingleCellExperiment with 292 rows and 38 columns

Other custom normalization can be applied using the sweep method, where normalization factors have to be supplied manually. As an example, we here normalize the samples using a scaled size factor.

sf <- colSums(assay(scp1, "proteins"), na.rm = TRUE) / 1E4
sweep(scp1, i = "proteins", 
      MARGIN = 2, ## 1 = by feature; 2 = by sample
      STATS = sf, FUN = "/",
      name = "proteins_sf")
#> An instance of class QFeatures containing 6 assays:
#>  [1] 190321S_LCA10_X_FP97AG: SingleCellExperiment with 166 rows and 11 columns 
#>  [2] 190222S_LCA9_X_FP94BM: SingleCellExperiment with 176 rows and 11 columns 
#>  [3] 190914S_LCB3_X_16plex_Set_21: SingleCellExperiment with 215 rows and 16 columns 
#>  [4] peptides: SingleCellExperiment with 539 rows and 38 columns 
#>  [5] proteins: SingleCellExperiment with 292 rows and 38 columns 
#>  [6] proteins_sf: SingleCellExperiment with 292 rows and 38 columns

4.4 Log transformation

The QFeatures package also provide the logTransform function to facilitate the transformation of the quantitative data. We here show its usage by transforming the protein data using a base 2 logarithm with a pseudo-count of one.

logTransform(scp1, i = "proteins", base = 2, pc = 1, 
             name = "proteins_log")
#> An instance of class QFeatures containing 6 assays:
#>  [1] 190321S_LCA10_X_FP97AG: SingleCellExperiment with 166 rows and 11 columns 
#>  [2] 190222S_LCA9_X_FP94BM: SingleCellExperiment with 176 rows and 11 columns 
#>  [3] 190914S_LCB3_X_16plex_Set_21: SingleCellExperiment with 215 rows and 16 columns 
#>  [4] peptides: SingleCellExperiment with 539 rows and 38 columns 
#>  [5] proteins: SingleCellExperiment with 292 rows and 38 columns 
#>  [6] proteins_log: SingleCellExperiment with 292 rows and 38 columns

4.5 Imputation

Finally, QFeatures offers an interface to a wide variety of imputation methods to replace missing data by estimated values. The list of available methods is given by ?MsCoreUtils::impute_matrix. We demonstrate the use of this function by replacing missing data using KNN imputation.

anyNA(assay(scp1, "proteins"))
#> [1] TRUE
scp1 <- impute(scp1, i = "proteins", method ="knn", k = 3)
#> Loading required namespace: impute
#> Warning in knnimp(x, k, maxmiss = rowmax, maxp = maxp): 284 rows with more than 50 % entries missing;
#>  mean imputation used for these rows
anyNA(assay(scp1, "proteins"))
#> [1] FALSE

5 Data visualization

Visualization of the feature and sample metadata is rather straightforward since those are stored as tables (see section Accessing the data). From those tables, any visualization tool can be applied. Note however that using ggplot2 require data.frames or tibbles but rowData and colData are stored as DFrames objects. You can easily convert one data format to another. For example, we plot the parental ion fraction (measure of spectral purity) for each of the three MS batches.

rd <- rbindRowData(scp1, i = 1:3) 
library("ggplot2")
ggplot(data.frame(rd)) +
    aes(y = PIF, 
        x = assay) +
    geom_boxplot()
#> Warning: Removed 64 rows containing non-finite values (stat_boxplot).

Combining the metadata and the quantitative data is more challenging since the risk of data mismatch is increased. The QFeatures package therefore provides th longFormat function to transform a QFeatures object in a long DFrame table. For instance, we plot the quantitative data distribution for the first assay according to the acquisition channel index and colour with respect to the sample type. Both pieces of information are taken from the colData, so we provide them as colvars.

lf <- longFormat(scp1[, , 1], 
                 colvars = c("SampleType", "Channel"))
#> Warning: 'experiments' dropped; see 'metadata'
#> harmonizing input:
#>   removing 103 sampleMap rows not in names(experiments)
#>   removing 27 colData rownames not in sampleMap 'primary'
ggplot(data.frame(lf)) +
    aes(x = Channel, 
        y = value,
        colour = SampleType) +
    geom_boxplot()

A more in-depth tutorial about data visualization from a QFeatures object is provided in the QFeautres visualization vignette.

Session information

R version 4.1.1 (2021-08-10)
Platform: x86_64-pc-linux-gnu (64-bit)
Running under: Ubuntu 20.04.3 LTS

Matrix products: default
BLAS:   /home/biocbuild/bbs-3.14-bioc/R/lib/libRblas.so
LAPACK: /home/biocbuild/bbs-3.14-bioc/R/lib/libRlapack.so

locale:
 [1] LC_CTYPE=en_US.UTF-8       LC_NUMERIC=C              
 [3] LC_TIME=en_GB              LC_COLLATE=C              
 [5] LC_MONETARY=en_US.UTF-8    LC_MESSAGES=en_US.UTF-8   
 [7] LC_PAPER=en_US.UTF-8       LC_NAME=C                 
 [9] LC_ADDRESS=C               LC_TELEPHONE=C            
[11] LC_MEASUREMENT=en_US.UTF-8 LC_IDENTIFICATION=C       

attached base packages:
[1] stats4    stats     graphics  grDevices utils     datasets  methods  
[8] base     

other attached packages:
 [1] ggplot2_3.3.5               scp_1.4.0                  
 [3] QFeatures_1.4.0             MultiAssayExperiment_1.20.0
 [5] SummarizedExperiment_1.24.0 Biobase_2.54.0             
 [7] GenomicRanges_1.46.0        GenomeInfoDb_1.30.0        
 [9] IRanges_2.28.0              S4Vectors_0.32.0           
[11] BiocGenerics_0.40.0         MatrixGenerics_1.6.0       
[13] matrixStats_0.61.0          BiocStyle_2.22.0           

loaded via a namespace (and not attached):
 [1] lattice_0.20-45             assertthat_0.2.1           
 [3] digest_0.6.28               SingleCellExperiment_1.16.0
 [5] utf8_1.2.2                  R6_2.5.1                   
 [7] evaluate_0.14               highr_0.9                  
 [9] pillar_1.6.4                zlibbioc_1.40.0            
[11] rlang_0.4.12                lazyeval_0.2.2             
[13] jquerylib_0.1.4             Matrix_1.3-4               
[15] rmarkdown_2.11              labeling_0.4.2             
[17] stringr_1.4.0               ProtGenerics_1.26.0        
[19] munsell_0.5.0               igraph_1.2.7               
[21] RCurl_1.98-1.5              DelayedArray_0.20.0        
[23] compiler_4.1.1              xfun_0.27                  
[25] pkgconfig_2.0.3             htmltools_0.5.2            
[27] tidyselect_1.1.1            tibble_3.1.5               
[29] GenomeInfoDbData_1.2.7      bookdown_0.24              
[31] fansi_0.5.0                 withr_2.4.2                
[33] crayon_1.4.1                dplyr_1.0.7                
[35] MASS_7.3-54                 bitops_1.0-7               
[37] grid_4.1.1                  gtable_0.3.0               
[39] jsonlite_1.7.2              lifecycle_1.0.1            
[41] DBI_1.1.1                   AnnotationFilter_1.18.0    
[43] magrittr_2.0.1              scales_1.1.1               
[45] MsCoreUtils_1.6.0           impute_1.68.0              
[47] stringi_1.7.5               farver_2.1.0               
[49] XVector_0.34.0              bslib_0.3.1                
[51] ellipsis_0.3.2              generics_0.1.1             
[53] vctrs_0.3.8                 tools_4.1.1                
[55] glue_1.4.2                  purrr_0.3.4                
[57] fastmap_1.1.0               yaml_2.2.1                 
[59] colorspace_2.0-2            clue_0.3-60                
[61] cluster_2.1.2               BiocManager_1.30.16        
[63] knitr_1.36                  sass_0.4.0                 

6 Reference