#devtools::install_github('RevolutionAnalytics/miniCRAN')
library(miniCRAN)
library(igraph)
## 
## Attaching package: 'igraph'
## The following objects are masked from 'package:stats':
## 
##     decompose, spectrum
## The following object is masked from 'package:base':
## 
##     union
library(magrittr)

–adjacency matrix–

adjacency_matrix<- function(webpage) {
  n <- max(apply(webpage, 2, max))
  A <- matrix(0, n, n)
  for (i in 1:nrow(webpage))
    A[webpage[i, ]$forward_link, webpage[i, ]$backward_link] <- 1
  A
}

–probability matrix–

probability_matrix <- function(G) {
  cs <- colSums(G)
  cs[cs == 0] <- 1
  n <- nrow(G)
  A <- matrix(0, nrow(G), ncol(G))
  for (i in 1:n)
    A[i, ] <- A[i, ] + G[i, ] / cs
  A
} #transform

–calculate eigenvalues–

eigen_matrix <- function(G, iter = 100) {
  iter <- 10
  n <- nrow(G)
  x <- rep(1, n)
  for (i in 1:iter)
    x <- G %*% x
  x / sum(x)
} #recursive

–consider damping coefficient alpha—

a_probability_matrix <- function(G, alpha = 0.85) {
  cs <- colSums(G)
  cs[cs == 0] <- 1
  n <- nrow(G)
  delta <- (1 - alpha) / n
  A <- matrix(delta, nrow(G), ncol(G))
  for (i in 1:n)
    A[i, ] <- A[i, ] + alpha * G[i, ] / cs
  A
}

–calculate matrix eigenvalues directly—

calculate_eigen_matrix <- function(G) {
  x <- Re(eigen(G)$vectors[, 1])
  x / sum(x)
}

—example—

webpage <- read.delim("webpage_4.txt", header=FALSE, stringsAsFactors=FALSE)
webpage <- read.delim("webpage_5.txt", header=FALSE, stringsAsFactors=FALSE)
names(webpage)<-c("backward_link","forward_link")
A <- adjacency_matrix(webpage);A
##      [,1] [,2] [,3] [,4] [,5]
## [1,]    0    0    1    1    0
## [2,]    1    0    0    0    0
## [3,]    1    1    0    1    1
## [4,]    1    1    0    0    0
## [5,]    0    0    1    0    0
G <- probability_matrix(A);G #without damping coefficient
##           [,1] [,2] [,3] [,4] [,5]
## [1,] 0.0000000  0.0  0.5  0.5    0
## [2,] 0.3333333  0.0  0.0  0.0    0
## [3,] 0.3333333  0.5  0.0  0.5    1
## [4,] 0.3333333  0.5  0.0  0.0    0
## [5,] 0.0000000  0.0  0.5  0.0    0
G <- a_probability_matrix(A);G #consider damping coefficient
##           [,1]  [,2]  [,3]  [,4] [,5]
## [1,] 0.0300000 0.030 0.455 0.455 0.03
## [2,] 0.3133333 0.030 0.030 0.030 0.03
## [3,] 0.3133333 0.455 0.030 0.455 0.88
## [4,] 0.3133333 0.455 0.030 0.030 0.03
## [5,] 0.0300000 0.030 0.455 0.030 0.03
q <- eigen_matrix(G, 100);q
##            [,1]
## [1,] 0.23787658
## [2,] 0.09685156
## [3,] 0.34793858
## [4,] 0.13838955
## [5,] 0.17894373
q <- calculate_eigen_matrix(G);q #calculat eigen directl
## [1] 0.23714058 0.09718983 0.34889409 0.13849551 0.17827999

–Download matrix of available packages at specific date–

MRAN <- "http://mran.revolutionanalytics.com/snapshot/2018-04-01/"
pdb <- MRAN %>%
  contrib.url(type = "source") %>%
  available.packages(type="source", filters = NULL)

–Use miniCRAN to build a graph of package dependencies–

g <- pdb[, "Package"] %>%
  makeDepGraph(availPkgs = pdb, suggests=FALSE, enhances=TRUE, includeBasePkgs = FALSE)
#Note that this step takes a while, expect ~15-30 seconds

–Use the page.rank algorithm in igraph and display Top 20 results–

pr <- g %>%
  page.rank(directed = FALSE) %>%
  use_series("vector") %>%
  sort(decreasing = TRUE) %>%
  as.matrix %>%
  set_colnames("page.rank")

pr2 <- as.data.frame(pr)
pr2
##                                  page.rank
## Rcpp                          2.769594e-02
## MASS                          1.467298e-02
## ggplot2                       1.290306e-02
## Matrix                        8.277510e-03
## dplyr                         7.639942e-03
## mvtnorm                       6.456906e-03
## survival                      6.214555e-03
## plyr                          6.166023e-03
## stringr                       5.427385e-03
## lattice                       4.852018e-03
## RcppArmadillo                 4.827472e-03
## httr                          4.733714e-03
## magrittr                      4.605816e-03
## jsonlite                      4.600137e-03
## data.table                    4.442557e-03
## sp                            4.300460e-03
## igraph                        4.276863e-03
## foreach                       3.814094e-03
## reshape2                      3.738058e-03
## shiny                         3.200776e-03
## tibble                        2.805434e-03
## tidyr                         2.778958e-03
## coda                          2.742676e-03
## RColorBrewer                  2.697613e-03
## XML                           2.627786e-03
## doParallel                    2.569101e-03
## zoo                           2.559062e-03
## raster                        2.417595e-03
## RCurl                         2.383648e-03
## nlme                          2.336299e-03
## numDeriv                      2.177811e-03
## purrr                         2.115572e-03
## rgl                           2.098330e-03
## scales                        2.074783e-03
## boot                          2.055540e-03
## mgcv                          1.995464e-03
## glmnet                        1.972933e-03
## ape                           1.971125e-03
## lubridate                     1.964713e-03
## lme4                          1.898648e-03
## Hmisc                         1.832038e-03
## gridExtra                     1.818998e-03
## xml2                          1.751552e-03
## digest                        1.751113e-03
## rJava                         1.726074e-03
## cluster                       1.691726e-03
## gtools                        1.634157e-03
## R6                            1.603327e-03
## fields                        1.555048e-03
## knitr                         1.536024e-03
## car                           1.534457e-03
## rgdal                         1.494790e-03
## abind                         1.445079e-03
## readr                         1.437670e-03
## RcppEigen                     1.431896e-03
## rlang                         1.421069e-03
## assertthat                    1.359723e-03
## gplots                        1.283630e-03
## Formula                       1.270164e-03
## BH                            1.246475e-03
## e1071                         1.232108e-03
## DBI                           1.217970e-03
## xtable                        1.217107e-03
## nnet                          1.194520e-03
## stringi                       1.147796e-03
## quadprog                      1.141643e-03
## lazyeval                      1.135839e-03
## randomForest                  1.128981e-03
## corpcor                       1.116741e-03
## curl                          1.088450e-03
## rgeos                         1.067305e-03
## robustbase                    1.065804e-03
## plotrix                       1.063989e-03
## vegan                         1.062894e-03
## quantreg                      1.057526e-03
## rpart                         1.034726e-03
## htmlwidgets                   1.016909e-03
## maptools                      9.898340e-04
## matrixStats                   9.882966e-04
## pracma                        9.696599e-04
## xts                           9.639044e-04
## htmltools                     9.551055e-04
## psych                         9.512862e-04
## deSolve                       8.936270e-04
## spatstat                      8.721539e-04
## R.utils                       8.720948e-04
## colorspace                    8.702052e-04
## forecast                      8.657466e-04
## rmarkdown                     8.474103e-04
## mclust                        8.388777e-04
## rjson                         8.298702e-04
## sandwich                      8.114039e-04
## reshape                       8.036890e-04
## Rcmdr                         7.924510e-04
## MCMCpack                      7.904859e-04
## iterators                     7.881418e-04
## mnormt                        7.738344e-04
## RSQLite                       7.586762e-04
## png                           7.458945e-04
## plotly                        7.452502e-04
## caret                         7.395434e-04
## statmod                       7.268274e-04
## rvest                         7.203363e-04
## checkmate                     7.165222e-04
## devtools                      7.145216e-04
## ppiPre                        7.121170e-04
## VGAM                          6.993892e-04
## msm                           6.803451e-04
## gdata                         6.605731e-04
## lmtest                        6.594444e-04
## rms                           6.564798e-04
## ade4                          6.507018e-04
## network                       6.391389e-04
## rootSolve                     6.384090e-04
## lavaan                        6.381815e-04
## spdep                         6.367867e-04
## rstan                         6.324921e-04
## RJSONIO                       6.296581e-04
## matrixcalc                    6.262586e-04
## foreign                       6.183521e-04
## lpSolve                       6.181497e-04
## maps                          6.168261e-04
## yaml                          6.145234e-04
## testthat                      6.120810e-04
## KernSmooth                    6.098551e-04
## slam                          6.070492e-04
## fda                           6.006803e-04
## graph                         6.000818e-04
## multcomp                      5.911694e-04
## pbapply                       5.888994e-04
## survey                        5.753419e-04
## Rsolnp                        5.752380e-04
## ROCR                          5.738856e-04
## rjags                         5.712716e-04
## combinat                      5.691916e-04
## tm                            5.664576e-04
## Biobase                       5.640016e-04
## base64enc                     5.593502e-04
## lars                          5.577866e-04
## class                         5.387358e-04
## minpack.lm                    5.251525e-04
## optimx                        5.208412e-04
## RcppParallel                  5.195262e-04
## kernlab                       5.188775e-04
## tkrplot                       5.175274e-04
## maGUI                         5.156625e-04
## geometry                      5.123155e-04
## sf                            5.078163e-04
## latticeExtra                  5.041563e-04
## broom                         4.993332e-04
## tseries                       4.987448e-04
## expm                          4.965217e-04
## texreg                        4.952945e-04
## snowfall                      4.867108e-04
## sfsmisc                       4.831983e-04
## ellipse                       4.804892e-04
## sna                           4.766428e-04
## nloptr                        4.756745e-04
## seqinr                        4.751245e-04
## readxl                        4.736177e-04
## Seurat                        4.707556e-04
## chron                         4.704026e-04
## copula                        4.628446e-04
## truncnorm                     4.617492e-04
## rstudioapi                    4.573302e-04
## bigmemory                     4.498589e-04
## crul                          4.489928e-04
## gWidgets                      4.478599e-04
## moments                       4.426049e-04
## pls                           4.406950e-04
## wavethresh                    4.402103e-04
## crayon                        4.401867e-04
## scatterplot3d                 4.374193e-04
## maxLik                        4.346596e-04
## phytools                      4.320625e-04
## DT                            4.314490e-04
## caTools                       4.285874e-04
## jpeg                          4.263203e-04
## pROC                          4.259912e-04
## signal                        4.254440e-04
## qgraph                        4.249323e-04
## nleqslv                       4.245002e-04
## FactoMineR                    4.149350e-04
## Rdpack                        4.148839e-04
## fBasics                       4.103394e-04
## geosphere                     4.102520e-04
## diceR                         4.061920e-04
## timeDate                      4.056116e-04
## oro.nifti                     3.994266e-04
## viridis                       3.990693e-04
## FNN                           3.975896e-04
## ergm                          3.973704e-04
## limma                         3.942923e-04
## progress                      3.914295e-04
## stargazer                     3.901736e-04
## V8                            3.901564e-04
## leaflet                       3.901541e-04
## metafor                       3.893287e-04
## shinyjs                       3.887355e-04
## Rglpk                         3.860024e-04
## ks                            3.836341e-04
## evd                           3.829505e-04
## mice                          3.757104e-04
## ggmap                         3.689430e-04
## glue                          3.669222e-04
## tidyverse                     3.661919e-04
## ggraptR                       3.658274e-04
## gWidgetsRGtk2                 3.648811e-04
## miniUI                        3.635311e-04
## bitops                        3.605749e-04
## gtable                        3.603604e-04
## partykit                      3.602557e-04
## clue                          3.581008e-04
## RGtk2                         3.575806e-04
## geiger                        3.569753e-04
## magic                         3.523803e-04
## ggrepel                       3.514612e-04
## ROI                           3.514544e-04
## DiagrammeR                    3.507979e-04
## splancs                       3.500529e-04
## cubature                      3.499572e-04
## lpSolveAPI                    3.488109e-04
## proxy                         3.476515e-04
## phangorn                      3.454379e-04
## BB                            3.421909e-04
## gstat                         3.414543e-04
## tcltk2                        3.400242e-04
## timeSeries                    3.397422e-04
## SparseM                       3.377320e-04
## gsl                           3.362037e-04
## gmp                           3.351168e-04
## GGally                        3.334768e-04
## R.methodsS3                   3.326650e-04
## haven                         3.317551e-04
## userfriendlyscience           3.304002e-04
## fdrtool                       3.287861e-04
## qtl                           3.276035e-04
## glasso                        3.269094e-04
## memoise                       3.265174e-04
## openxlsx                      3.234777e-04
## polynom                       3.223191e-04
## teachingApps                  3.175667e-04
## CompQuadForm                  3.173844e-04
## ncdf4                         3.170269e-04
## taxize                        3.167491e-04
## shape                         3.155298e-04
## leaps                         3.155065e-04
## R.oo                          3.148369e-04
## pander                        3.142752e-04
## quanteda                      3.098633e-04
## rappdirs                      3.098336e-04
## rrcov                         3.093610e-04
## sn                            3.082476e-04
## qdap                          3.056864e-04
## coin                          3.054994e-04
## stringdist                    3.049838e-04
## prediction                    3.047290e-04
## Wrapped                       3.033407e-04
## momentuHMM                    3.030814e-04
## party                         3.027987e-04
## lhs                           3.024978e-04
## mixOmics                      3.005308e-04
## dartR                         2.987416e-04
## BBmisc                        2.984984e-04
## fpc                           2.961732e-04
## vmsbase                       2.955226e-04
## miscTools                     2.944928e-04
## pscl                          2.942588e-04
## RcppProgress                  2.929282e-04
## limSolve                      2.927068e-04
## spam                          2.903076e-04
## np                            2.902765e-04
## NSM3                          2.899133e-04
## gamlss.dist                   2.898088e-04
## openssl                       2.897607e-04
## nortest                       2.897223e-04
## geoR                          2.890495e-04
## DEoptim                       2.857907e-04
## whisker                       2.851348e-04
## randtoolbox                   2.848170e-04
## kinship2                      2.843677e-04
## metacoder                     2.841534e-04
## MuMIn                         2.838090e-04
## gee                           2.835721e-04
## futile.logger                 2.819594e-04
## geepack                       2.817995e-04
## adegenet                      2.808867e-04
## xlsx                          2.801403e-04
## hybridEnsemble                2.788269e-04
## arm                           2.771243e-04
## gbm                           2.770514e-04
## assertive                     2.769835e-04
## deldir                        2.761125e-04
## gamlss                        2.759727e-04
## partitions                    2.753275e-04
## seriation                     2.748891e-04
## ShinyItemAnalysis             2.733941e-04
## distr                         2.727686e-04
## shinydashboard                2.701590e-04
## fitdistrplus                  2.700676e-04
## hash                          2.664154e-04
## Rmpfr                         2.661007e-04
## pryr                          2.658147e-04
## reticulate                    2.656698e-04
## mboost                        2.651023e-04
## future                        2.638901e-04
## emmeans                       2.629965e-04
## dbplyr                        2.622736e-04
## drake                         2.622224e-04
## radiant.data                  2.616457e-04
## sm                            2.612303e-04
## tidyquant                     2.611205e-04
## ff                            2.607736e-04
## NLP                           2.605140e-04
## AER                           2.604893e-04
## imager                        2.594495e-04
## orthopolynom                  2.586127e-04
## nlmixr                        2.583489e-04
## blkbox                        2.575226e-04
## quantmod                      2.574495e-04
## hexbin                        2.562812e-04
## tmvtnorm                      2.557517e-04
## ITNr                          2.557201e-04
## nnls                          2.549839e-04
## photobiology                  2.547625e-04
## plm                           2.540181e-04
## sjstats                       2.526833e-04
## MetamapsDB                    2.505498e-04
## roxygen2                      2.502954e-04
## RUnit                         2.498053e-04
## plot3D                        2.494738e-04
## pcaPP                         2.474073e-04
## warbleR                       2.467858e-04
## SDMTools                      2.466710e-04
## locfit                        2.464864e-04
## arules                        2.464493e-04
## assertive.base                2.459481e-04
## Rgraphviz                     2.456200e-04
## mafs                          2.448208e-04
## WGCNA                         2.445321e-04
## sparklyr                      2.443930e-04
## ggthemes                      2.428027e-04
## RSpectra                      2.426369e-04
## codetools                     2.425360e-04
## pubh                          2.414466e-04
## ltm                           2.410623e-04
## circular                      2.405757e-04
## mosaic                        2.402698e-04
## PWFSLSmoke                    2.397816e-04
## Biostrings                    2.391098e-04
## pcalg                         2.388098e-04
## withr                         2.377302e-04
## PopGenReport                  2.377238e-04
## BETS                          2.372393e-04
## raptr                         2.367237e-04
## penalized                     2.361067e-04
## markdown                      2.356653e-04
## wordcloud                     2.352107e-04
## plotKML                       2.330111e-04
## vcd                           2.324508e-04
## permute                       2.322515e-04
## prodlim                       2.319491e-04
## SnowballC                     2.316809e-04
## gRbase                        2.315924e-04
## stplanr                       2.300799e-04
## mirt                          2.300077e-04
## visNetwork                    2.296094e-04
## RandomFields                  2.271327e-04
## sqldf                         2.267994e-04
## Zelig                         2.266668e-04
## radiant.model                 2.264972e-04
## sjPlot                        2.262292e-04
## httpuv                        2.255311e-04
## classInt                      2.250229e-04
## ecospat                       2.245093e-04
## tidyselect                    2.243275e-04
## Epi                           2.233337e-04
## RAM                           2.231867e-04
## Deducer                       2.231433e-04
## ranger                        2.231352e-04
## RANN                          2.220531e-04
## pheatmap                      2.213583e-04
## rmutil                        2.211301e-04
## hypergeo                      2.209337e-04
## elasticnet                    2.187709e-04
## cairoDevice                   2.187030e-04
## jmv                           2.180840e-04
## RBGL                          2.160987e-04
## bit64                         2.158108e-04
## bea.R                         2.157510e-04
## dendextend                    2.155381e-04
## windfarmGA                    2.145212e-04
## svMisc                        2.144393e-04
## cmprsk                        2.136616e-04
## rstanarm                      2.131230e-04
## optiSel                       2.129107e-04
## RODBC                         2.128222e-04
## mapview                       2.126115e-04
## hypervolume                   2.122418e-04
## SpaDES.tools                  2.116325e-04
## misc3d                        2.115931e-04
## Rnightlights                  2.114270e-04
## waveslim                      2.114086e-04
## sptemExp                      2.112620e-04
## Countr                        2.111732e-04
## rlist                         2.110280e-04
## shinyBS                       2.109428e-04
## snow                          2.108537e-04
## spacetime                     2.108358e-04
## SGP                           2.101002e-04
## robCompositions               2.094565e-04
## R2jags                        2.092021e-04
## proto                         2.087095e-04
## IntClust                      2.085887e-04
## mlr                           2.085615e-04
## tensor                        2.082896e-04
## genBart                       2.074603e-04
## R2HTML                        2.073488e-04
## corrplot                      2.068364e-04
## genetics                      2.065461e-04
## uuid                          2.064280e-04
## pbdMPI                        2.062953e-04
## data.tree                     2.055738e-04
## shinystan                     2.044411e-04
## brainGraph                    2.044281e-04
## lidR                          2.038175e-04
## dtwclust                      2.034177e-04
## qvalue                        2.028858e-04
## fGarch                        2.026980e-04
## sdcMicro                      2.021767e-04
## dismo                         2.017111e-04
## RVAideMemoire                 2.013589e-04
## RcmdrPlugin.BiclustGUI        2.007490e-04
## betareg                       2.005185e-04
## lmerTest                      1.995968e-04
## xROI                          1.994983e-04
## RcmdrMisc                     1.991710e-04
## ReporteRs                     1.985532e-04
## KarsTS                        1.984411e-04
## refund                        1.983882e-04
## SpaDES.core                   1.983187e-04
## sets                          1.979635e-04
## cowplot                       1.979498e-04
## ncvreg                        1.978901e-04
## DiceKriging                   1.977749e-04
## IRanges                       1.975862e-04
## TeachingDemos                 1.975553e-04
## GA                            1.975068e-04
## spatialEco                    1.974820e-04
## OpenMx                        1.974067e-04
## BiasedUrn                     1.972763e-04
## sybil                         1.971291e-04
## rugarch                       1.967574e-04
## GenomicRanges                 1.965268e-04
## amt                           1.964036e-04
## Plasmode                      1.963484e-04
## biomod2                       1.957353e-04
## EMA                           1.955591e-04
## stacomiR                      1.946397e-04
## sirt                          1.946100e-04
## mlogit                        1.946091e-04
## drc                           1.943421e-04
## phylobase                     1.943306e-04
## bit                           1.941265e-04
## energy                        1.941206e-04
## shazam                        1.937979e-04
## memisc                        1.933759e-04
## gam                           1.933574e-04
## urca                          1.929572e-04
## VineCopula                    1.928273e-04
## XGR                           1.920193e-04
## openair                       1.919927e-04
## covmat                        1.914546e-04
## tuneR                         1.913067e-04
## Luminescence                  1.911189e-04
## strataG                       1.907780e-04
## recipes                       1.906184e-04
## impute                        1.902099e-04
## animation                     1.901005e-04
## NetworkToolbox                1.899254e-04
## RSDA                          1.898891e-04
## olsrr                         1.888365e-04
## StanHeaders                   1.878995e-04
## multtest                      1.872278e-04
## brew                          1.870899e-04
## matlab                        1.866778e-04
## AFM                           1.866499e-04
## inline                        1.865226e-04
## memapp                        1.864312e-04
## aroma.core                    1.863646e-04
## rasterVis                     1.860689e-04
## actuar                        1.860470e-04
## trust                         1.859905e-04
## sampling                      1.858426e-04
## elementR                      1.856415e-04
## Iso                           1.855169e-04
## eiCompare                     1.852361e-04
## hmi                           1.852277e-04
## treespace                     1.851238e-04
## geojsonio                     1.848753e-04
## FuzzyNumbers                  1.848750e-04
## simPop                        1.845463e-04
## MODIStsp                      1.845433e-04
## irlba                         1.842353e-04
## rminer                        1.839044e-04
## MAVIS                         1.838692e-04
## rpanel                        1.838104e-04
## calibrate                     1.833390e-04
## rARPACK                       1.833313e-04
## FME                           1.830688e-04
## smacof                        1.830429e-04
## EcoGenetics                   1.827446e-04
## ordinal                       1.825494e-04
## reproducible                  1.825060e-04
## LANDD                         1.824367e-04
## SCORPIUS                      1.821500e-04
## flexclust                     1.816753e-04
## uavRmp                        1.813326e-04
## mopa                          1.811716e-04
## gnm                           1.806551e-04
## fastcluster                   1.805641e-04
## tframe                        1.796992e-04
## dplR                          1.795107e-04
## sem                           1.794004e-04
## GJRM                          1.793731e-04
## minqa                         1.793538e-04
## entropy                       1.789838e-04
## doRNG                         1.787801e-04
## ck37r                         1.787462e-04
## opencpu                       1.786985e-04
## lsei                          1.786295e-04
## shinythemes                   1.784055e-04
## RWeka                         1.782788e-04
## sjmisc                        1.782112e-04
## htmlTable                     1.776361e-04
## doBy                          1.773939e-04
## cRegulome                     1.770418e-04
## dygraphs                      1.764875e-04
## SuppDists                     1.764281e-04
## biospear                      1.761013e-04
## DoE.base                      1.760795e-04
## GPareto                       1.759050e-04
## Biocomb                       1.758756e-04
## RecordLinkage                 1.758128e-04
## sigQC                         1.758000e-04
## Cairo                         1.751695e-04
## brms                          1.751125e-04
## FLightR                       1.748511e-04
## BAwiR                         1.747937e-04
## FD                            1.745955e-04
## pointblank                    1.745681e-04
## polyPK                        1.743715e-04
## MCMCglmm                      1.741996e-04
## MXM                           1.741716e-04
## MetaIntegrator                1.738623e-04
## iClick                        1.737675e-04
## GWSDAT                        1.736817e-04
## rcompanion                    1.736146e-04
## VIM                           1.734664e-04
## systemfit                     1.733403e-04
## alabama                       1.733255e-04
## CDM                           1.731469e-04
## nlcv                          1.731001e-04
## modeltools                    1.726925e-04
## ecd                           1.724896e-04
## statnet.common                1.723070e-04
## RMySQL                        1.722929e-04
## text2vec                      1.720568e-04
## MESS                          1.720362e-04
## PCRedux                       1.718205e-04
## bootnet                       1.714112e-04
## sentometrics                  1.710499e-04
## fPortfolio                    1.708500e-04
## rgenoud                       1.706245e-04
## extrafont                     1.705899e-04
## aqp                           1.705366e-04
## polycor                       1.702065e-04
## fastLink                      1.699522e-04
## hdrcde                        1.698048e-04
## FedData                       1.697076e-04
## vqtl                          1.694734e-04
## btergm                        1.693300e-04
## fulltext                      1.692921e-04
## neuropsychology               1.691796e-04
## forcats                       1.689698e-04
## usethis                       1.685903e-04
## zooaRchGUI                    1.684089e-04
## mapproj                       1.683247e-04
## phylocurve                    1.678678e-04
## CINNA                         1.678363e-04
## mvnfast                       1.678295e-04
## EventStudy                    1.677763e-04
## picante                       1.676795e-04
## semPlot                       1.672199e-04
## wmtsa                         1.668303e-04
## S4Vectors                     1.665385e-04
## codebook                      1.665161e-04
## stm                           1.663843e-04
## poppr                         1.660946e-04
## functional                    1.660134e-04
## heatmaply                     1.660113e-04
## noaastormevents               1.654263e-04
## radiant.multivariate          1.653712e-04
## VennDiagram                   1.652036e-04
## semiArtificial                1.651556e-04
## flexsurv                      1.650563e-04
## BayesianTools                 1.650499e-04
## robust                        1.650422e-04
## mixtools                      1.650270e-04
## SSDM                          1.647372e-04
## DLMtool                       1.646636e-04
## coxme                         1.643722e-04
## doSNOW                        1.640909e-04
## dpcR                          1.640631e-04
## breathtestcore                1.639750e-04
## smoof                         1.637516e-04
## oompaBase                     1.636193e-04
## emdi                          1.635692e-04
## quokar                        1.635339e-04
## GPArotation                   1.634307e-04
## KFAS                          1.634018e-04
## cvTools                       1.633274e-04
## rnoaa                         1.632833e-04
## rmgarch                       1.631368e-04
## git2r                         1.631261e-04
## healthcareai                  1.631031e-04
## pbdDEMO                       1.630842e-04
## backports                     1.628835e-04
## pdist                         1.628339e-04
## SpatialVx                     1.627799e-04
## SWMPr                         1.627646e-04
## FrF2                          1.627219e-04
## sharpshootR                   1.626522e-04
## pbkrtest                      1.626204e-04
## ggraph                        1.622939e-04
## umx                           1.619766e-04
## hoardeR                       1.619754e-04
## ltsa                          1.616334e-04
## ggplotAssist                  1.615624e-04
## trelliscope                   1.615607e-04
## processmapR                   1.614934e-04
## DNAcopy                       1.608196e-04
## nauf                          1.606103e-04
## GERGM                         1.604981e-04
## TTR                           1.603248e-04
## ggforce                       1.598225e-04
## R.cache                       1.598200e-04
## SpatialEpiApp                 1.597380e-04
## highcharter                   1.596323e-04
## startupmsg                    1.594933e-04
## acc                           1.594703e-04
## EnsembleBase                  1.594270e-04
## RPANDA                        1.592705e-04
## coneproj                      1.592470e-04
## myTAI                         1.592249e-04
## aroma.affymetrix              1.590620e-04
## detrendr                      1.589327e-04
## rhub                          1.589292e-04
## evolqg                        1.587883e-04
## HH                            1.587093e-04
## DescTools                     1.585682e-04
## HBP                           1.584934e-04
## JFE                           1.577650e-04
## effects                       1.577649e-04
## diagram                       1.577403e-04
## wallace                       1.576580e-04
## moveVis                       1.575319e-04
## CVXR                          1.573885e-04
## fracdiff                      1.567042e-04
## MBESS                         1.566594e-04
## bayesplot                     1.565540e-04
## mbgraphic                     1.563671e-04
## funcy                         1.561950e-04
## SeqFeatR                      1.561136e-04
## autoBagging                   1.560865e-04
## RStoolbox                     1.552751e-04
## NMF                           1.549023e-04
## FitAR                         1.549012e-04
## callr                         1.548400e-04
## poio                          1.548209e-04
## spatsurv                      1.547243e-04
## edeaR                         1.546925e-04
## adapr                         1.546021e-04
## factorMerger                  1.545883e-04
## multipanelfigure              1.542979e-04
## biofiles                      1.542044e-04
## starmie                       1.541924e-04
## spant                         1.540878e-04
## miceadds                      1.540650e-04
## CircStats                     1.539866e-04
## MetaLandSim                   1.536479e-04
## joineRML                      1.534986e-04
## NLMR                          1.534944e-04
## emulator                      1.534260e-04
## RPostgreSQL                   1.530838e-04
## RNifti                        1.530578e-04
## riskRegression                1.529205e-04
## ei                            1.527628e-04
## skpr                          1.526832e-04
## bbmle                         1.526640e-04
## rprojroot                     1.524892e-04
## kernDeepStackNet              1.524418e-04
## atlantistools                 1.524162e-04
## CADStat                       1.522223e-04
## clusterSim                    1.522209e-04
## SeerMapper                    1.520381e-04
## ePCR                          1.519589e-04
## joineRmeta                    1.518971e-04
## officer                       1.518157e-04
## distrEx                       1.516928e-04
## vdiffr                        1.516872e-04
## ggdendro                      1.516770e-04
## SocialMediaLab                1.515935e-04
## rags2ridges                   1.514964e-04
## TSP                           1.513447e-04
## ldstatsHD                     1.512674e-04
## circlize                      1.510122e-04
## plspm                         1.508118e-04
## BayesFactor                   1.506110e-04
## StatCharrms                   1.504819e-04
## colourpicker                  1.504811e-04
## tiff                          1.504231e-04
## cocoreg                       1.503521e-04
## dexter                        1.503492e-04
## surrosurv                     1.503119e-04
## bapred                        1.502105e-04
## textmining                    1.501337e-04
## FateID                        1.498759e-04
## mplot                         1.496382e-04
## pwr                           1.496244e-04
## vcfR                          1.495963e-04
## batchtools                    1.495081e-04
## tmaptools                     1.494306e-04
## petro.One                     1.493409e-04
## aslib                         1.491645e-04
## speedglm                      1.490286e-04
## stminsights                   1.489253e-04
## MplusAutomation               1.488610e-04
## Modeler                       1.486995e-04
## idealstan                     1.485548e-04
## SEERaBomb                     1.485229e-04
## RtutoR                        1.483728e-04
## stream                        1.483690e-04
## RBesT                         1.481226e-04
## BacArena                      1.481106e-04
## dtwSat                        1.480846e-04
## SurvRank                      1.480790e-04
## cplm                          1.477281e-04
## fDMA                          1.476135e-04
## AnnotationDbi                 1.475259e-04
## RxODE                         1.473290e-04
## huge                          1.472604e-04
## SKAT                          1.472351e-04
## irr                           1.472344e-04
## fingerPro                     1.472321e-04
## speaq                         1.471119e-04
## ggpubr                        1.470999e-04
## edgeR                         1.470248e-04
## DeLorean                      1.469363e-04
## flippant                      1.469099e-04
## gdalUtils                     1.467631e-04
## CorReg                        1.466342e-04
## genBaRcode                    1.465141e-04
## asht                          1.464567e-04
## vars                          1.464441e-04
## BrailleR                      1.461306e-04
## kyotil                        1.461217e-04
## RLRsim                        1.460634e-04
## lava                          1.457051e-04
## tidytext                      1.455943e-04
## bupaR                         1.455681e-04
## geostatsp                     1.454787e-04
## survminer                     1.454661e-04
## civis                         1.454523e-04
## tsensembler                   1.453643e-04
## chemmodlab                    1.453135e-04
## viridisLite                   1.450915e-04
## ggalt                         1.450035e-04
## ipred                         1.449958e-04
## baystability                  1.448871e-04
## rbokeh                        1.446883e-04
## mousetrap                     1.445686e-04
## genogeographer                1.445457e-04
## DDD                           1.444027e-04
## HTSSIP                        1.442746e-04
## Umatrix                       1.441628e-04
## synbreed                      1.438840e-04
## changepoint                   1.438465e-04
## RSEIS                         1.437547e-04
## lime                          1.436595e-04
## beadplexr                     1.436418e-04
## StroupGLMM                    1.434002e-04
## Surrogate                     1.433232e-04
## BatchJobs                     1.431678e-04
## fastmatch                     1.431564e-04
## mlt                           1.428289e-04
## choroplethr                   1.428135e-04
## PhylogeneticEM                1.428062e-04
## MODIS                         1.427400e-04
## kableExtra                    1.425658e-04
## OutbreakTools                 1.424918e-04
## DepthProc                     1.422400e-04
## psycho                        1.420452e-04
## available                     1.420019e-04
## Compind                       1.419263e-04
## chipPCR                       1.417835e-04
## flexmix                       1.417416e-04
## validate                      1.416610e-04
## ez                            1.414796e-04
## WRTDStidal                    1.414139e-04
## logistf                       1.413093e-04
## CARBayesST                    1.411747e-04
## qlcVisualize                  1.411648e-04
## TAM                           1.411280e-04
## DCD                           1.410250e-04
## gfer                          1.409515e-04
## R.matlab                      1.408576e-04
## cape                          1.407395e-04
## bomrang                       1.406845e-04
## Crossover                     1.406812e-04
## sarima                        1.406496e-04
## QRM                           1.406306e-04
## coalitions                    1.405938e-04
## extremeStat                   1.405776e-04
## HMMoce                        1.404838e-04
## biomartr                      1.404047e-04
## psychmeta                     1.403403e-04
## mev                           1.402596e-04
## LambertW                      1.402249e-04
## pkggraph                      1.402088e-04
## Rtsne                         1.401255e-04
## CovSelHigh                    1.400995e-04
## tensorflow                    1.399193e-04
## openVA                        1.399040e-04
## DMwR                          1.398858e-04
## alphahull                     1.398847e-04
## networkDynamic                1.397922e-04
## spocc                         1.396121e-04
## prisonbrief                   1.395971e-04
## toaster                       1.395784e-04
## timetk                        1.394256e-04
## googleAuthR                   1.393955e-04
## trackr                        1.392237e-04
## mrMLM                         1.392046e-04
## formula.tools                 1.390245e-04
## MixSIAR                       1.389904e-04
## subplex                       1.389815e-04
## expands                       1.389620e-04
## episensr                      1.389224e-04
## fAssets                       1.386979e-04
## VTrack                        1.386642e-04
## xgboost                       1.386617e-04
## PTXQC                         1.385194e-04
## JMbayes                       1.385132e-04
## plsRcox                       1.384736e-04
## scanstatistics                1.384507e-04
## Blaunet                       1.384476e-04
## gsubfn                        1.381366e-04
## factoextra                    1.378569e-04
## prioritizr                    1.378452e-04
## googleway                     1.376685e-04
## RgoogleMaps                   1.376654e-04
## inlmisc                       1.376598e-04
## geospt                        1.376554e-04
## rcdd                          1.374288e-04
## prettyGraphs                  1.374003e-04
## OpasnetUtils                  1.371738e-04
## saeRobust                     1.371545e-04
## visvow                        1.370037e-04
## DAMisc                        1.369203e-04
## rcdk                          1.369138e-04
## rENA                          1.368494e-04
## unmarked                      1.367628e-04
## earlywarnings                 1.367587e-04
## magicaxis                     1.366961e-04
## BPEC                          1.366759e-04
## imputeR                       1.366495e-04
## gvc                           1.365558e-04
## EbayesThresh                  1.365490e-04
## memery                        1.364903e-04
## nat                           1.364556e-04
## ParamHelpers                  1.364346e-04
## ggeffects                     1.363281e-04
## erah                          1.363261e-04
## mime                          1.362908e-04
## aod                           1.360248e-04
## Matching                      1.360207e-04
## gridBase                      1.359886e-04
## DHARMa                        1.359573e-04
## enviGCMS                      1.358954e-04
## splashr                       1.358620e-04
## ecoval                        1.358591e-04
## GPPFourier                    1.358591e-04
## nutshell                      1.358591e-04
## sequenza                      1.358591e-04
## msgps                         1.358591e-04
## RRNA                          1.358591e-04
## objectSignals                 1.358591e-04
## ucminf                        1.358345e-04
## genefilter                    1.357367e-04
## pegas                         1.357172e-04
## Plasmidprofiler               1.357000e-04
## skyscapeR                     1.355887e-04
## bayesm                        1.355082e-04
## EcoHydRology                  1.354868e-04
## TraMineR                      1.353917e-04
## glmmBUGS                      1.353824e-04
## lori                          1.353760e-04
## surveillance                  1.353729e-04
## annovarR                      1.353660e-04
## gkmSVM                        1.352807e-04
## gastempt                      1.352670e-04
## gRain                         1.352558e-04
## Gmisc                         1.352072e-04
## latentnet                     1.351975e-04
## marked                        1.351121e-04
## rainbow                       1.350939e-04
## tsDyn                         1.349906e-04
## rangeMapper                   1.348540e-04
## desc                          1.348083e-04
## bayesPop                      1.343825e-04
## sperrorest                    1.343517e-04
## tweet2r                       1.343467e-04
## RSSL                          1.343353e-04
## hyfo                          1.342596e-04
## MAGNAMWAR                     1.341656e-04
## phenopix                      1.341272e-04
## strucchange                   1.341177e-04
## textmineR                     1.339239e-04
## assertive.types               1.338966e-04
## GADMTools                     1.338525e-04
## blastula                      1.337848e-04
## RcmdrPlugin.temis             1.337428e-04
## wux                           1.337064e-04
## gpDDE                         1.335527e-04
## CovTools                      1.335516e-04
## shinyAce                      1.335157e-04
## minimaxdesign                 1.334553e-04
## ineq                          1.333969e-04
## ggdag                         1.333855e-04
## tigris                        1.332941e-04
## marmap                        1.331972e-04
## TSA                           1.331769e-04
## GenOrd                        1.330891e-04
## dendroTools                   1.330881e-04
## mc2d                          1.330247e-04
## snpStats                      1.328846e-04
## BMhyb                         1.328548e-04
## clisymbols                    1.328382e-04
## fda.usc                       1.327848e-04
## pspline                       1.327743e-04
## rSQM                          1.327326e-04
## vdmR                          1.327202e-04
## AlgDesign                     1.326670e-04
## analytics                     1.326222e-04
## emuR                          1.325482e-04
## REndo                         1.323399e-04
## rio                           1.323063e-04
## ICtest                        1.322803e-04
## tfruns                        1.321678e-04
## interflex                     1.320729e-04
## sparsereg                     1.319641e-04
## rattle                        1.319530e-04
## emdbook                       1.319322e-04
## netdiffuseR                   1.318369e-04
## gdtools                       1.317565e-04
## CARBayes                      1.317495e-04
## PSCBS                         1.316976e-04
## aws.signature                 1.316459e-04
## bookdown                      1.315272e-04
## bayou                         1.315082e-04
## GPCMlasso                     1.314890e-04
## rmapzen                       1.314834e-04
## bayesLopod                    1.314723e-04
## blackbox                      1.313086e-04
## clinfun                       1.313058e-04
## rsgcc                         1.312981e-04
## GEVStableGarch                1.312851e-04
## vortexR                       1.309772e-04
## date                          1.309659e-04
## synthpop                      1.308344e-04
## RTransProb                    1.308037e-04
## packagedocs                   1.307965e-04
## MVN                           1.305511e-04
## PAFit                         1.303943e-04
## gdistance                     1.303447e-04
## magick                        1.303406e-04
## SentimentAnalysis             1.302888e-04
## abjutils                      1.302438e-04
## OpenML                        1.302102e-04
## colordistance                 1.301733e-04
## spartan                       1.301407e-04
## tmap                          1.299921e-04
## rclimateca                    1.299897e-04
## filesstrings                  1.299648e-04
## truncdist                     1.297511e-04
## JWileymisc                    1.296101e-04
## anomalyDetection              1.294321e-04
## rebus                         1.293292e-04
## rebus.base                    1.293292e-04
## ggtern                        1.291901e-04
## styler                        1.291867e-04
## SensMap                       1.291315e-04
## intamap                       1.291084e-04
## XLConnect                     1.289106e-04
## TTAinterfaceTrendAnalysis     1.288880e-04
## AICcmodavg                    1.288097e-04
## PhyInformR                    1.286292e-04
## dtw                           1.285707e-04
## sjlabelled                    1.284212e-04
## DiffNet                       1.283209e-04
## earth                         1.283173e-04
## triangle                      1.282639e-04
## shapes                        1.282111e-04
## R2MLwiN                       1.280991e-04
## clickstream                   1.280493e-04
## pbivnorm                      1.280001e-04
## alakazam                      1.279844e-04
## iSDM                          1.279833e-04
## climwin                       1.277588e-04
## gencve                        1.276499e-04
## urltools                      1.276357e-04
## OutliersO3                    1.275998e-04
## lgcp                          1.274065e-04
## bibliometrix                  1.273984e-04
## muma                          1.273980e-04
## kohonen                       1.273793e-04
## Cluster.OBeu                  1.273414e-04
## hoardr                        1.272999e-04
## adlift                        1.272181e-04
## Causata                       1.271825e-04
## mapdata                       1.271259e-04
## GerminaR                      1.270962e-04
## secr                          1.270753e-04
## rlecuyer                      1.270459e-04
## skeleSim                      1.268939e-04
## fdasrvf                       1.267241e-04
## tergm                         1.265292e-04
## eggCounts                     1.264922e-04
## neuralnet                     1.264083e-04
## tidygraph                     1.264010e-04
## chemometrics                  1.263706e-04
## jpndistrict                   1.262111e-04
## RTextTools                    1.262024e-04
## diptest                       1.260594e-04
## georob                        1.260335e-04
## rtimicropem                   1.260121e-04
## loo                           1.260034e-04
## Fgmutils                      1.260020e-04
## GEOmap                        1.259858e-04
## gllvm                         1.259236e-04
## ArchaeoPhases                 1.259007e-04
## bikedata                      1.258933e-04
## HMP                           1.258923e-04
## biclust                       1.257854e-04
## mrds                          1.256295e-04
## FindIt                        1.256276e-04
## fractal                       1.256163e-04
## awspack                       1.255838e-04
## distrDoc                      1.255125e-04
## poliscidata                   1.254934e-04
## hms                           1.254690e-04
## spikeSlabGAM                  1.253543e-04
## epiR                          1.251761e-04
## BEACH                         1.251461e-04
## optiSolve                     1.249857e-04
## rpostgisLT                    1.249030e-04
## forestplot                    1.248808e-04
## SSN                           1.246467e-04
## infotheo                      1.245442e-04
## imbalance                     1.245359e-04
## bdsmatrix                     1.244092e-04
## RandVar                       1.242619e-04
## evaluator                     1.241883e-04
## drLumi                        1.241764e-04
## cli                           1.241552e-04
## FRK                           1.241395e-04
## lintr                         1.241071e-04
## spatstat.utils                1.241006e-04
## MEGENA                        1.239802e-04
## EBImage                       1.239701e-04
## seewave                       1.239361e-04
## NetLogoR                      1.238319e-04
## zoon                          1.237876e-04
## ggm                           1.237181e-04
## chillR                        1.235389e-04
## sde                           1.234343e-04
## bootstrap                     1.232129e-04
## spind                         1.231681e-04
## s2dverification               1.231111e-04
## PKPDmisc                      1.229674e-04
## grpreg                        1.229059e-04
## neuroim                       1.228454e-04
## TSdbi                         1.227151e-04
## funModeling                   1.226842e-04
## rworldmap                     1.225904e-04
## FADA                          1.225443e-04
## partialAR                     1.224793e-04
## OUwie                         1.223413e-04
## quickPlot                     1.223305e-04
## neurobase                     1.223102e-04
## GSE                           1.223093e-04
## binom                         1.222110e-04
## trackeR                       1.221736e-04
## micemd                        1.221661e-04
## Momocs                        1.220804e-04
## BANFF                         1.220345e-04
## fifer                         1.220185e-04
## NormalizeMets                 1.219117e-04
## ctmm                          1.218831e-04
## tidycensus                    1.218080e-04
## walker                        1.218066e-04
## breathteststan                1.217969e-04
## Anthropometry                 1.217339e-04
## dataone                       1.216748e-04
## demography                    1.216702e-04
## GDINA                         1.216474e-04
## seoR                          1.215303e-04
## mapfuser                      1.215238e-04
## mapedit                       1.214374e-04
## phylopath                     1.214050e-04
## afex                          1.213287e-04
## vennLasso                     1.212856e-04
## stabledist                    1.211811e-04
## PhenotypeSimulator            1.211772e-04
## NetRep                        1.211447e-04
## AutoModel                     1.211303e-04
## dfpk                          1.210660e-04
## Rphylopars                    1.210658e-04
## CaliCo                        1.209721e-04
## survClip                      1.209327e-04
## Kendall                       1.208980e-04
## ashr                          1.208964e-04
## dataRetrieval                 1.208730e-04
## countyweather                 1.207519e-04
## aoristic                      1.207473e-04
## ProFit                        1.207460e-04
## markovchain                   1.206715e-04
## readtext                      1.206132e-04
## paramlink                     1.205869e-04
## CDECRetrieve                  1.205340e-04
## togglr                        1.205221e-04
## Rsamtools                     1.203877e-04
## numbers                       1.203323e-04
## SemiParSampleSel              1.201648e-04
## rgbif                         1.200254e-04
## mudata2                       1.199041e-04
## lamW                          1.198438e-04
## treemap                       1.198295e-04
## TSdist                        1.197601e-04
## dynr                          1.197497e-04
## distrMod                      1.196801e-04
## spaMM                         1.196255e-04
## thinkr                        1.195772e-04
## preprocomb                    1.195418e-04
## biganalytics                  1.195394e-04
## ClassDiscovery                1.194947e-04
## Biograph                      1.194718e-04
## sBIC                          1.194566e-04
## Morpho                        1.194470e-04
## nowcasting                    1.194401e-04
## gMCP                          1.194258e-04
## fdapace                       1.193504e-04
## cpr                           1.192679e-04
## pathological                  1.192645e-04
## Cyclops                       1.192442e-04
## RNeXML                        1.188368e-04
## affy                          1.188102e-04
## tcR                           1.187643e-04
## ggridges                      1.187352e-04
## klaR                          1.187342e-04
## Greg                          1.186604e-04
## osmdata                       1.184050e-04
## automap                       1.183137e-04
## photobiologyInOut             1.182641e-04
## ExPosition                    1.182574e-04
## rdomains                      1.182551e-04
## readbitmap                    1.181406e-04
## pixiedust                     1.180270e-04
## splm                          1.180102e-04
## Brobdingnag                   1.177827e-04
## diffrprojects                 1.176561e-04
## hunspell                      1.174071e-04
## ReliabilityTheory             1.173828e-04
## BayesNetBP                    1.173306e-04
## bsam                          1.172861e-04
## mosaicModel                   1.172697e-04
## StereoMorph                   1.172263e-04
## sourceR                       1.171604e-04
## pdftools                      1.171280e-04
## lessR                         1.170687e-04
## ldamatch                      1.170121e-04
## rsconnect                     1.169962e-04
## sparkTable                    1.169364e-04
## strvalidator                  1.169095e-04
## ggpmisc                       1.168794e-04
## R.filesets                    1.168240e-04
## nima                          1.168195e-04
## tgp                           1.168174e-04
## ICS                           1.167668e-04
## lifelogr                      1.167576e-04
## SuperLearner                  1.167559e-04
## fastICA                       1.166940e-04
## emplik                        1.166481e-04
## networktools                  1.166431e-04
## pathfindR                     1.165771e-04
## Ecfun                         1.164752e-04
## StatMatch                     1.164745e-04
## survMisc                      1.164245e-04
## sampleSelection               1.164080e-04
## apmsWAPP                      1.163319e-04
## assertive.strings             1.163131e-04
## merTools                      1.162897e-04
## CluMix                        1.162051e-04
## relations                     1.161576e-04
## oce                           1.161181e-04
## ChainLadder                   1.160588e-04
## pez                           1.160368e-04
## C50                           1.158955e-04
## BMA                           1.158775e-04
## ICcalib                       1.158045e-04
## rpubchem                      1.157561e-04
## mvabund                       1.156840e-04
## moveHMM                       1.156407e-04
## epitools                      1.156233e-04
## sensors4plumes                1.156146e-04
## kgschart                      1.155145e-04
## gamclass                      1.154176e-04
## exprso                        1.154043e-04
## shinyHeatmaply                1.153285e-04
## abc                           1.153131e-04
## OpVaR                         1.153112e-04
## hurricaneexposure             1.152852e-04
## BioGeoBEARS                   1.151566e-04
## RJafroc                       1.150449e-04
## bamlss                        1.150438e-04
## radiant.basics                1.150211e-04
## Rfast                         1.150175e-04
## rpart.plot                    1.148931e-04
## ppcSpatial                    1.148623e-04
## lsmeans                       1.148145e-04
## etl                           1.148039e-04
## eLNNpaired                    1.147584e-04
## biglm                         1.147564e-04
## agricolae                     1.147485e-04
## longitudinalData              1.147126e-04
## StatDA                        1.145646e-04
## LSDsensitivity                1.145631e-04
## retistruct                    1.145542e-04
## inpdfr                        1.144332e-04
## reqres                        1.144190e-04
## runjags                       1.143787e-04
## EpiModel                      1.143430e-04
## tframePlus                    1.142547e-04
## outliers                      1.142138e-04
## treeclim                      1.141394e-04
## spectral.methods              1.140554e-04
## aLFQ                          1.140061e-04
## kokudosuuchi                  1.139804e-04
## parallelMap                   1.139558e-04
## themetagenomics               1.139304e-04
## ggiraphExtra                  1.139046e-04
## brglm                         1.138977e-04
## rosm                          1.138428e-04
## TROM                          1.137465e-04
## SparseLearner                 1.137355e-04
## landsepi                      1.137276e-04
## condformat                    1.137222e-04
## robustHD                      1.135570e-04
## recommenderlab                1.134193e-04
## RMAWGEN                       1.134120e-04
## theseus                       1.133775e-04
## partialCI                     1.133472e-04
## mistral                       1.133262e-04
## textclean                     1.132864e-04
## CONDOP                        1.132570e-04
## corHMM                        1.131828e-04
## lfstat                        1.131754e-04
## tidyhydat                     1.131587e-04
## MAINT.Data                    1.131218e-04
## fExtremes                     1.130972e-04
## ipumsr                        1.130489e-04
## wordspace                     1.130307e-04
## fbar                          1.129574e-04
## HydeNet                       1.129426e-04
## highfrequency                 1.129408e-04
## KoNLP                         1.129239e-04
## primerTree                    1.128402e-04
## ragt2ridges                   1.128394e-04
## archivist                     1.128192e-04
## ssanv                         1.127567e-04
## gmm                           1.127309e-04
## automagic                     1.127115e-04
## winRatioAnalysis              1.127020e-04
## sysfonts                      1.126290e-04
## alphavantager                 1.126235e-04
## lvnet                         1.125075e-04
## CondIndTests                  1.124981e-04
## pcaMethods                    1.124512e-04
## dispRity                      1.123946e-04
## RcmdrPlugin.FuzzyClust        1.123786e-04
## metagear                      1.123577e-04
## morse                         1.123487e-04
## MSeasy                        1.123474e-04
## shinyKGode                    1.123062e-04
## CensSpatial                   1.123029e-04
## tree                          1.122814e-04
## manifestoR                    1.121820e-04
## simPATHy                      1.121198e-04
## MetaLonDA                     1.121070e-04
## PredPsych                     1.120993e-04
## svars                         1.120934e-04
## PlasmaMutationDetector        1.120873e-04
## networkD3                     1.120233e-04
## GenomeInfoDb                  1.119839e-04
## CollapsABEL                   1.118216e-04
## Rfit                          1.118141e-04
## FSA                           1.117456e-04
## randomcoloR                   1.117233e-04
## extRemes                      1.115952e-04
## LearnBayes                    1.115267e-04
## mco                           1.115250e-04
## kdevine                       1.114843e-04
## uHMM                          1.114804e-04
## mtconnectR                    1.114566e-04
## sads                          1.114272e-04
## solrium                       1.114267e-04
## briskaR                       1.113482e-04
## haplo.stats                   1.113350e-04
## bastah                        1.112701e-04
## fiery                         1.111777e-04
## SparseTSCGM                   1.111453e-04
## ddalpha                       1.111213e-04
## gfcanalysis                   1.110990e-04
## randomForestExplainer         1.110921e-04
## NPflow                        1.110603e-04
## jpmesh                        1.110401e-04
## sva                           1.109830e-04
## adegraphics                   1.109541e-04
## mlVAR                         1.109486e-04
## polywog                       1.109458e-04
## GSIF                          1.109167e-04
## rtf                           1.109099e-04
## parcor                        1.108630e-04
## RPMG                          1.108567e-04
## SemiPar                       1.108436e-04
## lmomco                        1.108084e-04
## naniar                        1.107617e-04
## flare                         1.106217e-04
## RDS                           1.106159e-04
## soundgen                      1.105948e-04
## Rdimtools                     1.104771e-04
## gwdegree                      1.103819e-04
## OptimClassifier               1.103747e-04
## timereg                       1.103484e-04
## textreuse                     1.102906e-04
## segclust2d                    1.102203e-04
## bdvis                         1.101519e-04
## rcrossref                     1.101338e-04
## cati                          1.100861e-04
## orthoDr                       1.100571e-04
## clv                           1.100247e-04
## ftsa                          1.100080e-04
## graphicalVAR                  1.099750e-04
## RankAggreg                    1.098598e-04
## learnr                        1.098238e-04
## treatSens                     1.097375e-04
## SchemaOnRead                  1.097156e-04
## gmodels                       1.096962e-04
## multimark                     1.096602e-04
## TreeBUGS                      1.095974e-04
## planar                        1.095848e-04
## RPostgres                     1.095408e-04
## caper                         1.095179e-04
## modelr                        1.094871e-04
## arulesViz                     1.093277e-04
## respirometry                  1.092798e-04
## statsDK                       1.091581e-04
## dynatopmodel                  1.091297e-04
## meteoland                     1.091267e-04
## clustrd                       1.090774e-04
## poLCA                         1.090139e-04
## robustlmm                     1.089888e-04
## kknn                          1.089600e-04
## simPH                         1.088560e-04
## bnlearn                       1.087879e-04
## GenABEL                       1.087851e-04
## SimCorrMix                    1.086657e-04
## inctools                      1.086513e-04
## CLME                          1.086495e-04
## dbscan                        1.086278e-04
## swfscMisc                     1.085810e-04
## randomUniformForest           1.085056e-04
## analogue                      1.084855e-04
## imputeYn                      1.084531e-04
## ijtiff                        1.083041e-04
## downloader                    1.082986e-04
## dynamicTreeCut                1.082982e-04
## NFP                           1.082441e-04
## coefplot                      1.081648e-04
## revdbayes                     1.081548e-04
## valr                          1.080868e-04
## list                          1.080867e-04
## rscala                        1.080590e-04
## nproc                         1.080564e-04
## isotone                       1.080117e-04
## crosstalk                     1.078168e-04
## nonparaeff                    1.077951e-04
## rubias                        1.077184e-04
## ncappc                        1.077151e-04
## units                         1.076738e-04
## HiCblock                      1.075711e-04
## HiCglmi                       1.075711e-04
## HLMdiag                       1.075610e-04
## setRNG                        1.075225e-04
## JADE                          1.074615e-04
## stability                     1.074598e-04
## NOAAWeather                   1.074479e-04
## GPGame                        1.073968e-04
## nabor                         1.073044e-04
## MixGHD                        1.072834e-04
## icenReg                       1.072560e-04
## fold                          1.072366e-04
## fmriqa                        1.071891e-04
## ssym                          1.071734e-04
## assignPOP                     1.071009e-04
## TMB                           1.070931e-04
## googlesheets                  1.070687e-04
## mediation                     1.070440e-04
## RefManageR                    1.070138e-04
## pgirmess                      1.070107e-04
## SensMixed                     1.069637e-04
## eurostat                      1.069149e-04
## statnet                       1.069018e-04
## SimMultiCorrData              1.068842e-04
## spatialwarnings               1.068736e-04
## mpoly                         1.068505e-04
## r4ss                          1.067887e-04
## r2glmm                        1.067286e-04
## c060                          1.067110e-04
## cholera                       1.066737e-04
## birdring                      1.066502e-04
## lmSupport                     1.066027e-04
## ggedit                        1.065715e-04
## lmom                          1.065300e-04
## Mega2R                        1.065056e-04
## zeligverse                    1.064903e-04
## bujar                         1.064661e-04
## BioInstaller                  1.064049e-04
## landscapetools                1.063841e-04
## testit                        1.063604e-04
## psychotools                   1.063383e-04
## NetworkDistance               1.063355e-04
## drsmooth                      1.062818e-04
## traits                        1.062670e-04
## sparsevar                     1.062375e-04
## rsm                           1.062172e-04
## extracat                      1.062051e-04
## mem                           1.060620e-04
## tawny                         1.060280e-04
## ukbtools                      1.059650e-04
## grattan                       1.059246e-04
## tibbletime                    1.059106e-04
## rddtools                      1.058820e-04
## QVM                           1.058811e-04
## findpython                    1.058769e-04
## mcmcse                        1.058449e-04
## fMultivar                     1.058327e-04
## pixmap                        1.058188e-04
## RSAGA                         1.057990e-04
## deBInfer                      1.057912e-04
## bestglm                       1.057825e-04
## FactoClass                    1.057601e-04
## RcppGSL                       1.057251e-04
## congressbr                    1.057230e-04
## bold                          1.057167e-04
## RcmdrPlugin.BCA               1.056607e-04
## matchingMarkets               1.054928e-04
## iterpc                        1.054695e-04
## gaiah                         1.054509e-04
## compareGroups                 1.054441e-04
## GENLIB                        1.054339e-04
## rAvis                         1.053889e-04
## ggdmc                         1.053685e-04
## RobLoxBioC                    1.053573e-04
## epitable                      1.053327e-04
## BinOrdNonNor                  1.053321e-04
## aire.zmvm                     1.053036e-04
## dplyrAssist                   1.052863e-04
## bigKRLS                       1.052616e-04
## nonmemica                     1.052587e-04
## SimTimeVar                    1.052576e-04
## PerformanceAnalytics          1.052485e-04
## D2C                           1.052338e-04
## spduration                    1.051847e-04
## xpose                         1.051801e-04
## hdnom                         1.051281e-04
## NoiseFiltersR                 1.051068e-04
## MSGARCH                       1.050558e-04
## tidyLPA                       1.050182e-04
## pathClass                     1.049948e-04
## etm                           1.049752e-04
## nlt                           1.049587e-04
## TcGSA                         1.049288e-04
## eechidna                      1.049117e-04
## tRophicPosition               1.048874e-04
## joinXL                        1.048537e-04
## scpm                          1.048227e-04
## prcbench                      1.047951e-04
## zetadiv                       1.047651e-04
## Amelia                        1.047619e-04
## eha                           1.047406e-04
## EnvStats                      1.047179e-04
## gamCopula                     1.046330e-04
## BTR                           1.046158e-04
## survHE                        1.045002e-04
## qpcR                          1.044737e-04
## crawl                         1.043673e-04
## mdpeer                        1.043616e-04
## optCluster                    1.043528e-04
## MortHump                      1.043521e-04
## NetworkChange                 1.043301e-04
## stremr                        1.043167e-04
## ClusterR                      1.043085e-04
## childsds                      1.043072e-04
## tatoo                         1.042586e-04
## mvdalab                       1.042568e-04
## vcrpart                       1.042335e-04
## mlrMBO                        1.041951e-04
## wppExplorer                   1.041259e-04
## corpustools                   1.041097e-04
## EdSurvey                      1.040247e-04
## oai                           1.040132e-04
## simMP                         1.040094e-04
## dti                           1.039948e-04
## ggvis                         1.038855e-04
## Bchron                        1.038222e-04
## rangeBuilder                  1.037442e-04
## anytime                       1.037252e-04
## revtools                      1.036284e-04
## ggimage                       1.036225e-04
## fastqcr                       1.036048e-04
## iheatmapr                     1.035778e-04
## seqHMM                        1.035573e-04
## ffbase                        1.035368e-04
## VRPM                          1.035253e-04
## cellWise                      1.035066e-04
## turboEM                       1.034745e-04
## diffMeanVar                   1.034437e-04
## PMCMRplus                     1.033836e-04
## move                          1.033752e-04
## sdcTable                      1.033161e-04
## ismev                         1.033134e-04
## TSclust                       1.032647e-04
## lmem.gwaser                   1.032036e-04
## asbio                         1.031527e-04
## santaR                        1.031523e-04
## rFTRLProximal                 1.031450e-04
## kdecopula                     1.031041e-04
## textstem                      1.030941e-04
## gridsample                    1.030593e-04
## boclust                       1.030558e-04
## glmBfp                        1.029580e-04
## lavaSearch2                   1.028974e-04
## VIMGUI                        1.028730e-04
## MBA                           1.028699e-04
## BGData                        1.028565e-04
## skimr                         1.027918e-04
## threejs                       1.027629e-04
## bartMachine                   1.027267e-04
## penRvine                      1.026498e-04
## miRtest                       1.026484e-04
## CityWaterBalance              1.026389e-04
## socialmixr                    1.025476e-04
## SafeQuant                     1.025092e-04
## rlme                          1.024671e-04
## PlackettLuce                  1.023851e-04
## Infusion                      1.023616e-04
## mcmc                          1.023184e-04
## glm2                          1.023079e-04
## RItools                       1.022830e-04
## pec                           1.022789e-04
## SPreFuGED                     1.022516e-04
## stablespec                    1.022488e-04
## LEGIT                         1.022111e-04
## simr                          1.021946e-04
## bcRep                         1.021915e-04
## sppmix                        1.021297e-04
## interval                      1.021278e-04
## BNPMIXcluster                 1.021100e-04
## PKgraph                       1.020719e-04
## GenomicTools                  1.020331e-04
## febr                          1.019402e-04
## trackdem                      1.019177e-04
## lsa                           1.019061e-04
## pencopulaCond                 1.018594e-04
## frailtyEM                     1.018521e-04
## OpenRepGrid                   1.018520e-04
## ModelMap                      1.018272e-04
## textshape                     1.017879e-04
## ndtv                          1.017617e-04
## patternplot                   1.017169e-04
## IMIFA                         1.017032e-04
## OpenStreetMap                 1.016998e-04
## GRANBase                      1.016900e-04
## assertive.properties          1.016889e-04
## pdfetch                       1.016220e-04
## fOptions                      1.016197e-04
## jointseg                      1.016189e-04
## fastGHQuad                    1.014419e-04
## commonsMath                   1.013686e-04
## DPpackage                     1.012742e-04
## multicool                     1.012327e-04
## cdcfluview                    1.012112e-04
## Bessel                        1.011521e-04
## rplos                         1.011444e-04
## KMgene                        1.011258e-04
## topicmodels                   1.011136e-04
## penalizedSVM                  1.011019e-04
## SparseFactorAnalysis          1.010939e-04
## TrajDataMining                1.010674e-04
## formatR                       1.010330e-04
## ZeligEI                       1.009410e-04
## tnam                          1.009241e-04
## reReg                         1.009180e-04
## pkgmaker                      1.008658e-04
## curvHDR                       1.008434e-04
## RPPanalyzer                   1.007910e-04
## DiceOptim                     1.007872e-04
## missDeaths                    1.007779e-04
## CryptRndTest                  1.007737e-04
## RQDA                          1.007262e-04
## bssm                          1.006417e-04
## ggspatial                     1.006086e-04
## TSsql                         1.005592e-04
## soilDB                        1.005552e-04
## textreadr                     1.004758e-04
## PReMiuM                       1.003682e-04
## svDialogs                     1.003476e-04
## ie2misc                       1.002702e-04
## configr                       1.002097e-04
## mirtCAT                       1.001869e-04
## gistr                         1.001496e-04
## iml                           1.001484e-04
## InterpretMSSpectrum           1.001319e-04
## Compositional                 1.001170e-04
## ssizeRNA                      1.001137e-04
## moderndive                    1.001107e-04
## TIMP                          1.001070e-04
## SixSigma                      1.000572e-04
## ClimDown                      1.000423e-04
## rNOMADS                       1.000300e-04
## FFTrees                       1.000274e-04
## MCPAN                         1.000202e-04
## CORElearn                     9.999757e-05
## gWidgets2                     9.989240e-05
## ggfortify                     9.985353e-05
## BSL                           9.983764e-05
## rtext                         9.980729e-05
## sejmRP                        9.980562e-05
## ggspectra                     9.979298e-05
## icensBKL                      9.978888e-05
## gapfill                       9.975742e-05
## yuimaGUI                      9.974656e-05
## mda                           9.973940e-05
## pamr                          9.973291e-05
## StMoMo                        9.973263e-05
## rerddap                       9.966413e-05
## GenSA                         9.958531e-05
## QUIC                          9.953973e-05
## spatial.tools                 9.952682e-05
## metagen                       9.951497e-05
## MiRAnorm                      9.949341e-05
## HistDAWass                    9.947478e-05
## MatchIt                       9.942361e-05
## yaImpute                      9.942210e-05
## colorRamps                    9.940172e-05
## prevR                         9.938871e-05
## HardyWeinberg                 9.938197e-05
## caRpools                      9.937793e-05
## marcher                       9.934630e-05
## tspmeta                       9.930359e-05
## bipartite                     9.927001e-05
## ddpcr                         9.922651e-05
## stocks                        9.915166e-05
## meta                          9.913729e-05
## Rilostat                      9.913222e-05
## NPMOD                         9.912265e-05
## geomorph                      9.911449e-05
## googleCloudStorageR           9.906538e-05
## ESTER                         9.897702e-05
## PAC                           9.895403e-05
## fungible                      9.894252e-05
## d3r                           9.891901e-05
## meaRtools                     9.886666e-05
## itertools                     9.885755e-05
## neldermead                    9.881094e-05
## JM                            9.880821e-05
## stylo                         9.874030e-05
## biomaRt                       9.873549e-05
## RSA                           9.869542e-05
## nonlinearTseries              9.865483e-05
## genalg                        9.859532e-05
## kangar00                      9.858245e-05
## RobLox                        9.856179e-05
## som                           9.855575e-05
## yuima                         9.851600e-05
## fastR2                        9.851270e-05
## nse                           9.847710e-05
## DeducerSpatial                9.846900e-05
## metricTester                  9.841564e-05
## Rlab                          9.834603e-05
## DESeq2                        9.833774e-05
## tfestimators                  9.833612e-05
## phylosignal                   9.829998e-05
## robustBLME                    9.826704e-05
## oro.dicom                     9.823418e-05
## hts                           9.820174e-05
## taxa                          9.820149e-05
## openNLP                       9.819804e-05
## binman                        9.819012e-05
## hrbrthemes                    9.818144e-05
## blavaan                       9.814209e-05
## wordbankr                     9.811675e-05
## capm                          9.810069e-05
## seasonalview                  9.803034e-05
## tadaatoolbox                  9.794224e-05
## mrfDepth                      9.793030e-05
## mvbutils                      9.792937e-05
## hydroTSM                      9.792465e-05
## WVPlots                       9.789810e-05
## simmer                        9.789360e-05
## RobAStBase                    9.787779e-05
## dplyr.teradata                9.776172e-05
## Ricetl                        9.775743e-05
## TR8                           9.774261e-05
## NSA                           9.771423e-05
## shapefiles                    9.768959e-05
## nlr                           9.768733e-05
## eda4treeR                     9.766181e-05
## DiceDesign                    9.762760e-05
## mlbgameday                    9.752675e-05
## SIBER                         9.751555e-05
## rmeta                         9.746267e-05
## crypto                        9.744071e-05
## RmarineHeatWaves              9.741510e-05
## clValid                       9.736749e-05
## MEET                          9.735195e-05
## mets                          9.735025e-05
## tmlenet                       9.734978e-05
## dgo                           9.733272e-05
## coala                         9.733150e-05
## cutpointr                     9.733094e-05
## mcMST                         9.732915e-05
## detectRUNS                    9.729983e-05
## ALA4R                         9.729019e-05
## kntnr                         9.728207e-05
## MazamaSpatialUtils            9.726939e-05
## cytominer                     9.725392e-05
## SPUTNIK                       9.721701e-05
## iemisc                        9.721487e-05
## RDML                          9.712221e-05
## SpatialTools                  9.709226e-05
## influxdbr                     9.705951e-05
## tokenizers                    9.704515e-05
## rgho                          9.698798e-05
## addinslist                    9.696968e-05
## pbmcapply                     9.695495e-05
## DClusterm                     9.694953e-05
## iRF                           9.688548e-05
## ProjectionBasedClustering     9.686697e-05
## tuneRanger                    9.685933e-05
## symbolicDA                    9.680083e-05
## sisus                         9.677994e-05
## cg                            9.672574e-05
## survJamda                     9.672497e-05
## drgee                         9.671333e-05
## ss3sim                        9.669779e-05
## questionr                     9.665814e-05
## bdynsys                       9.665058e-05
## irtoys                        9.660386e-05
## directlabels                  9.654129e-05
## flip                          9.652541e-05
## tsibble                       9.652298e-05
## censReg                       9.650126e-05
## huxtable                      9.648316e-05
## pairwiseCI                    9.645839e-05
## TBSSurvival                   9.642333e-05
## PairedData                    9.641645e-05
## gofCopula                     9.629755e-05
## SpatialEpi                    9.624669e-05
## DCA                           9.620233e-05
## GetTDData                     9.618375e-05
## fergm                         9.616830e-05
## translateSPSS2R               9.616030e-05
## Rlda                          9.608354e-05
## ecodist                       9.608204e-05
## MlBayesOpt                    9.604467e-05
## dynlm                         9.603374e-05
## githubinstall                 9.599557e-05
## osmplotr                      9.599398e-05
## RFmarkerDetector              9.595638e-05
## gsynth                        9.595360e-05
## bulletr                       9.591332e-05
## tawny.types                   9.588175e-05
## projector                     9.579484e-05
## mapStats                      9.577531e-05
## getTBinR                      9.576075e-05
## PEIP                          9.573951e-05
## ghyp                          9.570038e-05
## ENiRG                         9.569328e-05
## RcppRoll                      9.568819e-05
## GUIProfiler                   9.568433e-05
## bgsmtr                        9.561992e-05
## survutils                     9.561096e-05
## airGRteaching                 9.557371e-05
## svd                           9.557001e-05
## CompDist                      9.552918e-05
## rospca                        9.552008e-05
## evaluate                      9.550791e-05
## filling                       9.550200e-05
## sbpiper                       9.549368e-05
## MEclustnet                    9.549026e-05
## mdsr                          9.548864e-05
## sensitivity                   9.545804e-05
## radiant                       9.543297e-05
## jmvcore                       9.540756e-05
## gdimap                        9.536969e-05
## TInPosition                   9.534851e-05
## hierarchicalSets              9.530944e-05
## Familias                      9.530642e-05
## QCA                           9.518138e-05
## CENFA                         9.512517e-05
## idem                          9.512364e-05
## BayesianNetwork               9.509514e-05
## DNLC                          9.506187e-05
## oem                           9.503610e-05
## kirby21.base                  9.502700e-05
## optBiomarker                  9.498765e-05
## rstpm2                        9.497808e-05
## iprior                        9.497251e-05
## mombf                         9.496779e-05
## ggmosaic                      9.490953e-05
## TeXCheckR                     9.486948e-05
## RQGIS                         9.486689e-05
## eclust                        9.483286e-05
## LICORS                        9.480807e-05
## BiBitR                        9.480335e-05
## geosptdb                      9.478294e-05
## strum                         9.476311e-05
## bridgesampling                9.472774e-05
## ConR                          9.465233e-05
## DoseFinding                   9.464883e-05
## pmxTools                      9.462288e-05
## gss                           9.461750e-05
## DistributionUtils             9.459062e-05
## odbc                          9.454440e-05
## keras                         9.453965e-05
## survivALL                     9.453339e-05
## IPtoCountry                   9.453045e-05
## DynNom                        9.450735e-05
## beanz                         9.440991e-05
## EAinference                   9.439418e-05
## rprev                         9.432031e-05
## demi                          9.431979e-05
## syuzhet                       9.428660e-05
## TukeyRegion                   9.426627e-05
## clespr                        9.426254e-05
## d3heatmap                     9.425639e-05
## rsolr                         9.423319e-05
## semtree                       9.416119e-05
## dummies                       9.412321e-05
## stormwindmodel                9.410415e-05
## ClusVis                       9.409815e-05
## celestial                     9.409116e-05
## googleVis                     9.406420e-05
## inTrees                       9.404952e-05
## DoE.wrapper                   9.404551e-05
## bio3d                         9.402851e-05
## qte                           9.401533e-05
## GrammR                        9.399950e-05
## PrevMap                       9.398556e-05
## rrepast                       9.397465e-05
## RNiftyReg                     9.391731e-05
## rnrfa                         9.384254e-05
## Rook                          9.383269e-05
## dprep                         9.382988e-05
## particles                     9.378385e-05
## BatchExperiments              9.378385e-05
## hglm                          9.373264e-05
## rlfsm                         9.370861e-05
## stpp                          9.369646e-05
## RSelenium                     9.369548e-05
## kSamples                      9.366820e-05
## rwty                          9.366620e-05
## boxr                          9.366314e-05
## DISTRIB                       9.363713e-05
## CIDnetworks                   9.363430e-05
## MALDIquantForeign             9.362681e-05
## PLMIX                         9.360900e-05
## mutossGUI                     9.358996e-05
## JuniperKernel                 9.355400e-05
## qdapTools                     9.354099e-05
## useful                        9.352568e-05
## cobs                          9.350184e-05
## RunuranGUI                    9.345994e-05
## horserule                     9.343937e-05
## greport                       9.340040e-05
## BMhyd                         9.339769e-05
## PythonInR                     9.339421e-05
## trialr                        9.338780e-05
## SwarmSVM                      9.337018e-05
## papeR                         9.336177e-05
## rtide                         9.329704e-05
## geozoning                     9.328750e-05
## phantom                       9.326143e-05
## ExomeDepth                    9.325970e-05
## ecoengine                     9.320979e-05
## exactci                       9.320886e-05
## sNPLS                         9.320321e-05
## TSrepr                        9.317993e-05
## subspaceMOA                   9.317725e-05
## politeness                    9.315715e-05
## ncdf.tools                    9.314950e-05
## bsts                          9.313834e-05
## GEint                         9.311741e-05
## yCrypticRNAs                  9.309070e-05
## ACMEeqtl                      9.308863e-05
## AggregateR                    9.308863e-05
## APPEstimation                 9.308863e-05
## AR1seg                        9.308863e-05
## ArrayBin                      9.308863e-05
## BASIX                         9.308863e-05
## batade                        9.308863e-05
## checkr                        9.308863e-05
## clues                         9.308863e-05
## dbEmpLikeGOF                  9.308863e-05
## dynCorr                       9.308863e-05
## edcc                          9.308863e-05
## elec                          9.308863e-05
## errorist                      9.308863e-05
## evidenceFactors               9.308863e-05
## FMC                           9.308863e-05
## FMStable                      9.308863e-05
## HSAUR2                        9.308863e-05
## hydroApps                     9.308863e-05
## keep                          9.308863e-05
## ksrlive                       9.308863e-05
## MaxSkew                       9.308863e-05
## mazealls                      9.308863e-05
## mcc                           9.308863e-05
## metaRNASeq                    9.308863e-05
## multigraph                    9.308863e-05
## NostalgiR                     9.308863e-05
## orgutils                      9.308863e-05
## powerEQTL                     9.308863e-05
## PROscorer                     9.308863e-05
## qtbase                        9.308863e-05
## rdpower                       9.308863e-05
## Rduino                        9.308863e-05
## regtest                       9.308863e-05
## rphast                        9.308863e-05
## rstream                       9.308863e-05
## S2sls                         9.308863e-05
## saccades                      9.308863e-05
## sankey                        9.308863e-05
## SECP                          9.308863e-05
## Sequential                    9.308863e-05
## BlockFeST                     9.308863e-05
## dbEmpLikeNorm                 9.308863e-05
## densratio                     9.308863e-05
## dummy                         9.308863e-05
## elec.strat                    9.308863e-05
## filematrix                    9.308863e-05
## harmonicmeanp                 9.308863e-05
## hwriter                       9.308863e-05
## kpodclustr                    9.308863e-05
## lpridge                       9.308863e-05
## matrixsampling                9.308863e-05
## minimalRSD                    9.308863e-05
## multiplex                     9.308863e-05
## MultiSkew                     9.308863e-05
## MVA                           9.308863e-05
## nsRFA                         9.308863e-05
## PBNPA                         9.308863e-05
## powerMediation                9.308863e-05
## PROscorerTools                9.308863e-05
## qtpaint                       9.308863e-05
## rdrobust                      9.308863e-05
## rindex                        9.308863e-05
## rpdo                          9.308863e-05
## rtfbs                         9.308863e-05
## searcher                      9.308863e-05
## Segmentor3IsBack              9.308863e-05
## sensitivitymv                 9.308863e-05
## SequentialDesign              9.308863e-05
## serial                        9.308863e-05
## simEd                         9.308863e-05
## simplegraph                   9.308863e-05
## spanel                        9.308863e-05
## spc                           9.308863e-05
## SPSL                          9.308863e-05
## textutils                     9.308863e-05
## tightClust                    9.308863e-05
## TurtleGraphics                9.308863e-05
## txtplot                       9.308863e-05
## ZIBBSeqDiscovery              9.308863e-05
## zoom                          9.308863e-05
## SAGx                          9.308863e-05
## robustarima                   9.308863e-05
## splusTimeDate                 9.308863e-05
## splusTimeSeries               9.308863e-05
## npregfast                     9.305585e-05
## vardpoor                      9.299316e-05
## dissever                      9.299108e-05
## HeritSeq                      9.297379e-05
## swirlify                      9.294147e-05
## tableone                      9.293349e-05
## LBSPR                         9.291196e-05
## hierarchicalDS                9.290983e-05
## Tnseq                         9.290121e-05
## webshot                       9.287969e-05
## manipulate                    9.286644e-05
## pastecs                       9.284973e-05
## mosaicCore                    9.280832e-05
## fpmoutliers                   9.274909e-05
## QuantumClone                  9.268825e-05
## letsR                         9.266551e-05
## epoc                          9.265118e-05
## mregions                      9.262888e-05
## mvmesh                        9.260949e-05
## BANEScarparkinglite           9.259894e-05
## webdriver                     9.258659e-05
## jug                           9.255739e-05
## EffectLiteR                   9.255646e-05
## mpath                         9.254351e-05
## plsRbeta                      9.253118e-05
## ppcor                         9.252298e-05
## red                           9.249974e-05
## penDvine                      9.247063e-05
## SSL                           9.238253e-05
## personalized                  9.237316e-05
## MetabolomicsBasics            9.235988e-05
## equSA                         9.231487e-05
## netgen                        9.230804e-05
## evoper                        9.227877e-05
## GAS                           9.227733e-05
## dnet                          9.220826e-05
## FDboost                       9.215834e-05
## multilevelPSA                 9.215242e-05
## sqlutils                      9.214618e-05
## gcmr                          9.214432e-05
## spGARCH                       9.214081e-05
## simmr                         9.211533e-05
## gsDesign                      9.209723e-05
## denpro                        9.199935e-05
## miscF                         9.195962e-05
## IncucyteDRC                   9.194555e-05
## loa                           9.194135e-05
## refund.shiny                  9.189108e-05
## zooimage                      9.188747e-05
## lambda.r                      9.187165e-05
## tmbstan                       9.184660e-05
## servr                         9.183792e-05
## svglite                       9.182080e-05
## remoter                       9.181515e-05
## clustMD                       9.180833e-05
## bioinactivation               9.177529e-05
## mapr                          9.173610e-05
## HDCI                          9.172882e-05
## ProTrackR                     9.172805e-05
## ggExtra                       9.170024e-05
## FCGR                          9.165624e-05
## bayesLife                     9.160153e-05
## seasonal                      9.159854e-05
## decompr                       9.157234e-05
## wiod                          9.157234e-05
## preproviz                     9.157170e-05
## mitools                       9.156863e-05
## gpairs                        9.155272e-05
## RJDBC                         9.142943e-05
## opentraj                      9.141335e-05
## LAM                           9.139110e-05
## tram                          9.135976e-05
## EthSEQ                        9.134102e-05
## RcmdrPlugin.KMggplot2         9.129248e-05
## tiger                         9.124284e-05
## rLiDAR                        9.122284e-05
## GO.db                         9.122261e-05
## labdsv                        9.112710e-05
## exampletestr                  9.112109e-05
## pdp                           9.101798e-05
## diffEq                        9.099688e-05
## BIGL                          9.097760e-05
## objectProperties              9.095011e-05
## rdiversity                    9.092521e-05
## pmclust                       9.085981e-05
## valuer                        9.085877e-05
## mlbench                       9.085479e-05
## imputeTestbench               9.078828e-05
## incadata                      9.077732e-05
## repr                          9.076487e-05
## CytobankAPI                   9.072023e-05
## paleofire                     9.070433e-05
## temperatureresponse           9.069626e-05
## brglm2                        9.067270e-05
## boa                           9.066621e-05
## radiant.design                9.066363e-05
## mixKernel                     9.059694e-05
## rust                          9.058365e-05
## taxizedb                      9.055807e-05
## dfoptim                       9.050675e-05
## fontquiver                    9.050252e-05
## egcm                          9.048563e-05
## mrgsolve                      9.037515e-05
## futureheatwaves               9.036723e-05
## AUC                           9.036205e-05
## DiversityOccupancy            9.034430e-05
## ggformula                     9.031465e-05
## spef                          9.029306e-05
## geomerge                      9.027860e-05
## datasus                       9.023075e-05
## gitter                        9.021849e-05
## Wats                          9.019269e-05
## forecastHybrid                9.015082e-05
## bayesTFR                      9.013357e-05
## walkr                         9.011824e-05
## spm                           9.011474e-05
## showtext                      9.005405e-05
## proustr                       9.004323e-05
## Kernelheaping                 9.002423e-05
## Haplin                        8.999518e-05
## estimatr                      8.999084e-05
## rolypoly                      8.997712e-05
## nlsr                          8.993006e-05
## rtdists                       8.992659e-05
## haploReconstruct              8.990970e-05
## melviewr                      8.988897e-05
## qualtRics                     8.983557e-05
## gravity                       8.982526e-05
## CosmoPhotoz                   8.981956e-05
## xesreadR                      8.980310e-05
## milr                          8.980224e-05
## LaplacesDemon                 8.979262e-05
## ACNE                          8.965446e-05
## scalpel                       8.964071e-05
## adespatial                    8.955905e-05
## bayesDem                      8.949824e-05
## corrr                         8.948769e-05
## binnednp                      8.945506e-05
## bossMaps                      8.944082e-05
## adehabitatHR                  8.941872e-05
## aroma.cn                      8.938453e-05
## tidyRSS                       8.938085e-05
## cooccurNet                    8.937761e-05
## preText                       8.933699e-05
## swmmr                         8.930605e-05
## vegalite                      8.929781e-05
## EFDR                          8.927939e-05
## FAOSTAT                       8.920914e-05
## precrec                       8.918127e-05
## bigtime                       8.914276e-05
## gemtc                         8.913575e-05
## TSmisc                        8.907025e-05
## TDA                           8.903015e-05
## mvctm                         8.898538e-05
## googleAnalyticsR              8.895086e-05
## ITGM                          8.894207e-05
## geoSpectral                   8.890902e-05
## adephylo                      8.890364e-05
## koRpus                        8.889435e-05
## datadogr                      8.884399e-05
## OpenImageR                    8.882019e-05
## iptools                       8.880266e-05
## rkward                        8.877603e-05
## roadoi                        8.874996e-05
## PerFit                        8.873560e-05
## MultiPhen                     8.867535e-05
## RAPIDR                        8.858862e-05
## redcapAPI                     8.856412e-05
## fingertipsR                   8.853879e-05
## leaflet.extras                8.851912e-05
## RcmdrPlugin.SCDA              8.850789e-05
## llama                         8.844365e-05
## glmmsr                        8.844344e-05
## quantable                     8.844277e-05
## plsRglm                       8.842132e-05
## gridGraphics                  8.836694e-05
## cowsay                        8.834011e-05
## metaplus                      8.833685e-05
## CFC                           8.833217e-05
## ggnetwork                     8.832844e-05
## sweep                         8.832073e-05
## bhrcr                         8.830832e-05
## janitor                       8.830206e-05
## sergeant                      8.829478e-05
## TriMatch                      8.826861e-05
## TELP                          8.822553e-05
## mbbefd                        8.822538e-05
## eegkit                        8.819554e-05
## MfUSampler                    8.819100e-05
## Cprob                         8.818968e-05
## PolynomF                      8.817569e-05
## biglasso                      8.816807e-05
## RVPedigree                    8.815064e-05
## creditr                       8.814370e-05
## inferr                        8.808640e-05
## dat                           8.807359e-05
## CATkit                        8.806231e-05
## RMTstat                       8.802379e-05
## SUMMER                        8.801071e-05
## RNewsflow                     8.799931e-05
## biplotbootGUI                 8.797059e-05
## incgraph                      8.796656e-05
## DATforDCEMRI                  8.793756e-05
## lfl                           8.793639e-05
## MatrixCorrelation             8.793569e-05
## kappalab                      8.792907e-05
## anchoredDistr                 8.789135e-05
## bkmr                          8.787046e-05
## tensorBSS                     8.783229e-05
## aws.s3                        8.780509e-05
## SourceSet                     8.778565e-05
## mvMonitoring                  8.778504e-05
## prcr                          8.777070e-05
## pacotest                      8.776766e-05
## optiRum                       8.775968e-05
## fence                         8.775223e-05
## iteRates                      8.774775e-05
## unpivotr                      8.773086e-05
## blogdown                      8.772655e-05
## RevEcoR                       8.772354e-05
## BCA                           8.768966e-05
## Rraven                        8.768227e-05
## clordr                        8.765991e-05
## rfigshare                     8.765272e-05
## IHSEP                         8.764868e-05
## abcrf                         8.762661e-05
## spectacles                    8.757156e-05
## polmineR                      8.754977e-05
## chinese.misc                  8.751127e-05
## rmapshaper                    8.751081e-05
## epidata                       8.750983e-05
## datadr                        8.745631e-05
## Rlinsolve                     8.745103e-05
## ThreeWay                      8.744141e-05
## multibiplotGUI                8.740475e-05
## matchMulti                    8.740277e-05
## tidyinftheo                   8.734861e-05
## caretEnsemble                 8.722868e-05
## DStree                        8.719699e-05
## HRQoL                         8.717121e-05
## PROreg                        8.717121e-05
## GeneralizedHyperbolic         8.716991e-05
## CoDiNA                        8.716252e-05
## rusda                         8.711357e-05
## ForecastComb                  8.707342e-05
## ReacTran                      8.703571e-05
## dodgr                         8.697741e-05
## fSRM                          8.695011e-05
## plsgenomics                   8.684490e-05
## Datasmith                     8.681227e-05
## descriptr                     8.680900e-05
## cate                          8.677833e-05
## IntegratedMRF                 8.671712e-05
## reportRx                      8.671277e-05
## wpp2017                       8.668846e-05
## BTYDplus                      8.668674e-05
## survidm                       8.662497e-05
## gdpc                          8.661878e-05
## relaimpo                      8.661339e-05
## TSfame                        8.659132e-05
## smart                         8.658854e-05
## skmeans                       8.657461e-05
## stepR                         8.656260e-05
## PCDimension                   8.656055e-05
## cleanEHR                      8.654287e-05
## ICSShiny                      8.653153e-05
## EasyMARK                      8.648970e-05
## tswge                         8.648222e-05
## ari                           8.646889e-05
## vpc                           8.646061e-05
## mvmeta                        8.644340e-05
## BSDA                          8.641236e-05
## clifro                        8.637126e-05
## IRISSeismic                   8.635734e-05
## nhanesA                       8.635533e-05
## Rmixmod                       8.634237e-05
## countrycode                   8.631589e-05
## faoutlier                     8.626953e-05
## rtracklayer                   8.626672e-05
## glmmTMB                       8.626381e-05
## densityClust                  8.624564e-05
## tester                        8.624242e-05
## LINselect                     8.622509e-05
## laeken                        8.621550e-05
## KMsurv                        8.618853e-05
## tidyposterior                 8.618491e-05
## PSF                           8.613532e-05
## surveybootstrap               8.612353e-05
## ESGtoolkit                    8.610873e-05
## catSurv                       8.610867e-05
## tigerstats                    8.609947e-05
## metaSEM                       8.609517e-05
## exact2x2                      8.607653e-05
## otvPlots                      8.605505e-05
## OPDOE                         8.604898e-05
## LMERConvenienceFunctions      8.602792e-05
## redist                        8.602015e-05
## ibmdbR                        8.601950e-05
## circglmbayes                  8.601211e-05
## vows                          8.600607e-05
## weights                       8.600504e-05
## pedigree                      8.598876e-05
## RGENERATEPREC                 8.598176e-05
## stpm                          8.596462e-05
## BLCOP                         8.592377e-05
## rhandsontable                 8.591157e-05
## crunch                        8.583951e-05
## mptools                       8.581940e-05
## ezsim                         8.580474e-05
## geofacet                      8.579882e-05
## pso                           8.575316e-05
## clickR                        8.574100e-05
## ADGofTest                     8.566673e-05
## RcmdrPlugin.EACSPIR           8.566078e-05
## mlearning                     8.563577e-05
## regplot                       8.562094e-05
## soundecology                  8.560410e-05
## FSelector                     8.555671e-05
## mstate                        8.554796e-05
## sysid                         8.547044e-05
## optmatch                      8.544587e-05
## pinnacle.API                  8.543070e-05
## LOST                          8.540894e-05
## FeatureHashing                8.539781e-05
## lpme                          8.531609e-05
## ccfa                          8.527322e-05
## DMwR2                         8.524861e-05
## lmms                          8.517687e-05
## wikilake                      8.513996e-05
## quantspec                     8.513671e-05
## metaplot                      8.510336e-05
## mlDNA                         8.508518e-05
## rvg                           8.506830e-05
## binaryGP                      8.501753e-05
## RcmdrPlugin.epack             8.499770e-05
## PKNCA                         8.497329e-05
## phyloseq                      8.496311e-05
## StableEstim                   8.494045e-05
## goldi                         8.489968e-05
## networkreporting              8.489491e-05
## dclone                        8.484842e-05
## gridSVG                       8.484690e-05
## ecr                           8.483404e-05
## Boom                          8.483019e-05
## propagate                     8.481521e-05
## LogisticDx                    8.476222e-05
## penaltyLearning               8.473523e-05
## comato                        8.472971e-05
## dsrTest                       8.471168e-05
## eAnalytics                    8.469422e-05
## webmockr                      8.464643e-05
## RFOC                          8.463261e-05
## ptstem                        8.461556e-05
## dGAselID                      8.458603e-05
## sprinter                      8.457752e-05
## bazar                         8.456128e-05
## dynfrail                      8.456030e-05
## lbfgs                         8.455862e-05
## gamm4                         8.453945e-05
## manipulateWidget              8.453795e-05
## rtweet                        8.452314e-05
## stratvns                      8.448771e-05
## tis                           8.448648e-05
## SigTree                       8.448445e-05
## ifultools                     8.446904e-05
## RcmdrPlugin.RMTCJags          8.444353e-05
## netcom                        8.443970e-05
## heemod                        8.440770e-05
## smooth                        8.439786e-05
## SensoMineR                    8.435275e-05
## netgwas                       8.433600e-05
## rrcovHD                       8.431292e-05
## uniReg                        8.429422e-05
## wikitaxa                      8.428322e-05
## hisse                         8.424405e-05
## DSsim                         8.423715e-05
## entropart                     8.422349e-05
## Eagle                         8.417508e-05
## distances                     8.415073e-05
## scclust                       8.415073e-05
## admixturegraph                8.414506e-05
## rrpack                        8.412794e-05
## spfrontier                    8.412779e-05
## RcmdrPlugin.DoE               8.412590e-05
## datautils                     8.412312e-05
## HYRISK                        8.411634e-05
## rbison                        8.410649e-05
## nFactors                      8.408755e-05
## basefun                       8.402359e-05
## multiDimBio                   8.402323e-05
## LCAvarsel                     8.400115e-05
## microclass                    8.397620e-05
## vetools                       8.396036e-05
## GetDFPData                    8.393348e-05
## GetITRData                    8.393348e-05
## dataMaid                      8.392379e-05
## backShift                     8.388570e-05
## IRISMustangMetrics            8.387864e-05
## RLumShiny                     8.386697e-05
## fRegression                   8.386406e-05
## clustermq                     8.382991e-05
## bioOED                        8.378353e-05
## FuzzyStatProb                 8.376347e-05
## afmToolkit                    8.376050e-05
## EvolutionaryGames             8.374922e-05
## BuyseTest                     8.373418e-05
## foghorn                       8.370685e-05
## splus2R                       8.367152e-05
## INCATome                      8.365991e-05
## cope                          8.365300e-05
## skm                           8.363691e-05
## qcc                           8.360331e-05
## hellno                        8.358572e-05
## STEPCAM                       8.353776e-05
## harrietr                      8.353223e-05
## grplasso                      8.349862e-05
## imputeLCMD                    8.347827e-05
## RNAseqNet                     8.346874e-05
## lingtypology                  8.345384e-05
## LIHNPSD                       8.343741e-05
## mma                           8.343715e-05
## scalreg                       8.340071e-05
## sylly.en                      8.335959e-05
## seaaroundus                   8.335890e-05
## PCMRS                         8.330492e-05
## ChaosGame                     8.326590e-05
## DAMOCLES                      8.325290e-05
## pbdBASE                       8.319568e-05
## mnis                          8.319480e-05
## shapeR                        8.319418e-05
## ggstance                      8.319364e-05
## ICAOD                         8.316748e-05
## wdman                         8.316497e-05
## autothresholdr                8.315833e-05
## QuantTools                    8.315164e-05
## dotwhisker                    8.313218e-05
## TSodbc                        8.312620e-05
## spBayesSurv                   8.312307e-05
## GUIgems                       8.311509e-05
## TScompare                     8.310656e-05
## ecoseries                     8.309757e-05
## imageData                     8.302649e-05
## SQUAREM                       8.297356e-05
## TropFishR                     8.295011e-05
## tcpl                          8.290869e-05
## RNCEP                         8.290246e-05
## qat                           8.288681e-05
## SIDES                         8.287105e-05
## yardstick                     8.287031e-05
## crossdes                      8.285548e-05
## likelihoodAsy                 8.283087e-05
## gglogo                        8.281471e-05
## misclassGLM                   8.280136e-05
## geneNetBP                     8.279044e-05
## phase1RMD                     8.278454e-05
## cartography                   8.278272e-05
## psytabs                       8.277674e-05
## sidrar                        8.276767e-05
## nlstimedist                   8.276489e-05
## apcluster                     8.275739e-05
## bmlm                          8.266019e-05
## PPforest                      8.265288e-05
## classyfire                    8.262630e-05
## PropCIs                       8.259651e-05
## factorstochvol                8.258735e-05
## reproducer                    8.257804e-05
## Rquake                        8.256335e-05
## future.apply                  8.254382e-05
## mcclust                       8.253599e-05
## gogamer                       8.252708e-05
## countyfloods                  8.250875e-05
## RNetCDF                       8.250361e-05
## statar                        8.250079e-05
## preprocessCore                8.249285e-05
## FHtest                        8.248420e-05
## define                        8.248383e-05
## velox                         8.246456e-05
## ETAS                          8.244876e-05
## ubeR                          8.244503e-05
## fdANOVA                       8.242780e-05
## g2f                           8.241744e-05
## jiebaR                        8.241485e-05
## poweRlaw                      8.239758e-05
## GB2                           8.236750e-05
## Quandl                        8.236494e-05
## rsig                          8.235630e-05
## smacpod                       8.235365e-05
## kamila                        8.234876e-05
## bdlp                          8.229178e-05
## SpaDES.addins                 8.228454e-05
## emil                          8.223939e-05
## NetworkExtinction             8.220592e-05
## NCutYX                        8.218634e-05
## xpose4                        8.218381e-05
## tsBSS                         8.211421e-05
## WMCapacity                    8.210141e-05
## ccafs                         8.209501e-05
## CONS                          8.209218e-05
## ggplotgui                     8.206437e-05
## evir                          8.205793e-05
## poibin                        8.205213e-05
## dirmult                       8.204158e-05
## adehabitatMA                  8.198439e-05
## lmmen                         8.194491e-05
## treeDA                        8.194145e-05
## parlitools                    8.192376e-05
## filehash                      8.187229e-05
## ContaminatedMixt              8.187056e-05
## soil.spec                     8.186806e-05
## samr                          8.181901e-05
## ICSNP                         8.180793e-05
## rmcfs                         8.177672e-05
## prozor                        8.177626e-05
## highriskzone                  8.177193e-05
## matie                         8.175890e-05
## frailtypack                   8.174949e-05
## adehabitatLT                  8.160762e-05
## ROptRegTS                     8.158955e-05
## moko                          8.154699e-05
## tigger                        8.154258e-05
## mkin                          8.151955e-05
## HybridFS                      8.151430e-05
## Rprofet                       8.149870e-05
## HI                            8.144344e-05
## pleiades                      8.143272e-05
## blscrapeR                     8.142354e-05
## BTLLasso                      8.141652e-05
## intervals                     8.139929e-05
## sentimentr                    8.138887e-05
## immer                         8.137065e-05
## benchmark                     8.134699e-05
## stationaRy                    8.134253e-05
## hdme                          8.133324e-05
## gridsampler                   8.129423e-05
## Benchmarking                  8.128999e-05
## MiSPU                         8.127582e-05
## ProbitSpatial                 8.125700e-05
## biogram                       8.120366e-05
## TrafficBDE                    8.119900e-05
## dynamichazard                 8.116773e-05
## brr                           8.116397e-05
## phylosim                      8.107438e-05
## tetraclasse                   8.098462e-05
## geoparser                     8.095837e-05
## PoloniexR                     8.094259e-05
## erer                          8.091431e-05
## pdR                           8.090175e-05
## bigpca                        8.089518e-05
## ZeligChoice                   8.089451e-05
## powerplus                     8.089234e-05
## flexrsurv                     8.089073e-05
## kernelFactory                 8.088677e-05
## R2WinBUGS                     8.087184e-05
## formattable                   8.086759e-05
## BIFIEsurvey                   8.086746e-05
## BaM                           8.084925e-05
## argparse                      8.084057e-05
## mschart                       8.080750e-05
## LPR                           8.079581e-05
## boolean3                      8.079135e-05
## BaBooN                        8.078363e-05
## gpuR                          8.076804e-05
## amap                          8.073970e-05
## AbsFilterGSEA                 8.073774e-05
## hansard                       8.073195e-05
## gitlabr                       8.071339e-05
## XKCDdata                      8.067482e-05
## calmate                       8.064095e-05
## assertive.files               8.063473e-05
## webTRISr                      8.062008e-05
## samplingVarEst                8.061288e-05
## distrSim                      8.058234e-05
## IGM.MEA                       8.058197e-05
## googledrive                   8.055936e-05
## RSNPset                       8.052518e-05
## classiFunc                    8.051504e-05
## psychometric                  8.050345e-05
## purrrlyr                      8.050305e-05
## trtf                          8.048390e-05
## D3partitionR                  8.047831e-05
## WikiSocio                     8.046805e-05
## ChocoLattes                   8.045239e-05
## idefix                        8.042716e-05
## cellranger                    8.042378e-05
## onemap                        8.041970e-05
## hydroscoper                   8.039106e-05
## fuser                         8.037546e-05
## registry                      8.035787e-05
## xseq                          8.029057e-05
## cricketr                      8.027856e-05
## parboost                      8.027495e-05
## intamapInteractive            8.023585e-05
## FRESA.CAD                     8.019440e-05
## bindrcpp                      8.016464e-05
## RcmdrPlugin.UCA               8.012460e-05
## flowDiv                       8.012131e-05
## BayesBD                       8.008155e-05
## EasyABC                       8.001922e-05
## gphmm                         8.000457e-05
## termstrc                      7.996122e-05
## qlcData                       7.995361e-05
## Sim.PLFN                      7.994970e-05
## BSagri                        7.993983e-05
## earlyR                        7.993334e-05
## wand                          7.991314e-05
## mau                           7.990856e-05
## LAGOSNE                       7.989116e-05
## CRANsearcher                  7.988434e-05
## QRAGadget                     7.987391e-05
## sugrrants                     7.980521e-05
## Diderot                       7.979346e-05
## MixedPsy                      7.976593e-05
## carfima                       7.976294e-05
## TSPostgreSQL                  7.974102e-05
## bindata                       7.973938e-05
## cem                           7.973044e-05
## spacom                        7.971216e-05
## compoisson                    7.970825e-05
## spsurvey                      7.969432e-05
## openadds                      7.969283e-05
## machina                       7.967832e-05
## classify                      7.965829e-05
## powerbydesign                 7.965592e-05
## knockoff                      7.963472e-05
## MFKnockoffs                   7.963472e-05
## APfun                         7.962605e-05
## RcmdrPlugin.NMBU              7.961137e-05
## nonnest2                      7.958306e-05
## OasisR                        7.953949e-05
## vanddraabe                    7.953898e-05
## hexSticker                    7.950196e-05
## AzureML                       7.949184e-05
## GANPA                         7.948884e-05
## dLagM                         7.947366e-05
## fmri                          7.946555e-05
## growfunctions                 7.945903e-05
## tm.plugin.webmining           7.945152e-05
## distrEllipse                  7.944850e-05
## cr17                          7.944497e-05
## rentrez                       7.942151e-05
## LogicReg                      7.940333e-05
## foreSIGHT                     7.939467e-05
## nullabor                      7.937662e-05
## BigVAR                        7.937549e-05
## dbmss                         7.936371e-05
## distcomp                      7.935907e-05
## tsfa                          7.934722e-05
## REddyProc                     7.934016e-05
## MCMCprecision                 7.931070e-05
## survAUC                       7.929920e-05
## restriktor                    7.929381e-05
## ash                           7.928805e-05
## driftR                        7.926964e-05
## hybridModels                  7.924801e-05
## relevent                      7.924696e-05
## pcr                           7.921654e-05
## statnetWeb                    7.921106e-05
## fbRads                        7.919908e-05
## binhf                         7.919645e-05
## tables                        7.916962e-05
## banR                          7.914392e-05
## SDD                           7.911504e-05
## GSODR                         7.906223e-05
## SurvDisc                      7.902036e-05
## ahnr                          7.901772e-05
## normalp                       7.900278e-05
## ontologyPlot                  7.897109e-05
## gRim                          7.895863e-05
## xergm                         7.892063e-05
## simcausal                     7.891919e-05
## ompr                          7.891392e-05
## rchess                        7.891349e-05
## lassoshooting                 7.891132e-05
## paleobioDB                    7.889623e-05
## mglR                          7.881244e-05
## veccompare                    7.879042e-05
## gamm4.test                    7.878268e-05
## readODS                       7.878076e-05
## boral                         7.878046e-05
## micEconCES                    7.875976e-05
## networkTomography             7.872728e-05
## coloc                         7.872278e-05
## GeomComb                      7.870711e-05
## SIRItoGTFS                    7.867129e-05
## plotluck                      7.867091e-05
## IsingSampler                  7.866636e-05
## goftest                       7.864107e-05
## JavaGD                        7.862792e-05
## SPOT                          7.862177e-05
## UncerIn2                      7.858521e-05
## SubgrpID                      7.856974e-05
## spaceNet                      7.855888e-05
## perspectev                    7.853540e-05
## rAmCharts                     7.847694e-05
## uwIntroStats                  7.846468e-05
## dsm                           7.841680e-05
## SACCR                         7.839684e-05
## enpls                         7.837345e-05
## label.switching               7.836922e-05
## rcmdcheck                     7.836402e-05
## ldhmm                         7.835365e-05
## pirate                        7.833297e-05
## eemR                          7.832200e-05
## TTCA                          7.830999e-05
## classifierplots               7.826124e-05
## mixlm                         7.825996e-05
## R.devices                     7.823349e-05
## CHNOSZ                        7.822670e-05
## opticut                       7.821664e-05
## ciTools                       7.820683e-05
## metRology                     7.817953e-05
## grapherator                   7.817070e-05
## metaviz                       7.816677e-05
## isva                          7.815782e-05
## rase                          7.813518e-05
## biotools                      7.813381e-05
## sparseLDA                     7.811856e-05
## NPCirc                        7.811457e-05
## rankFD                        7.807180e-05
## HURDAT                        7.806952e-05
## RObsDat                       7.806446e-05
## loglognorm                    7.801760e-05
## MetabolAnalyze                7.801396e-05
## IRTShiny                      7.801033e-05
## tfplot                        7.799508e-05
## FishResp                      7.796218e-05
## ClusterStability              7.794308e-05
## qrLMM                         7.793731e-05
## qrNLMM                        7.793731e-05
## EMbC                          7.793344e-05
## bridger2                      7.791851e-05
## joineR                        7.790878e-05
## MendelianRandomization        7.788188e-05
## cranly                        7.787792e-05
## MonteCarlo                    7.787039e-05
## wTO                           7.786814e-05
## drtmle                        7.786055e-05
## KrigInv                       7.785696e-05
## nngeo                         7.783280e-05
## icosa                         7.782857e-05
## phenomap                      7.782386e-05
## diagis                        7.781928e-05
## TreeSim                       7.781253e-05
## survivalsvm                   7.780223e-05
## adepro                        7.779974e-05
## TimeWarp                      7.779616e-05
## DeducerPlugInScaling          7.778220e-05
## CensMixReg                    7.776335e-05
## textTinyR                     7.775410e-05
## strandCet                     7.774809e-05
## dcmr                          7.774784e-05
## BMisc                         7.773954e-05
## qualpalr                      7.768492e-05
## dbfaker                       7.768063e-05
## randnet                       7.764230e-05
## kerdiest                      7.762232e-05
## rotl                          7.761203e-05
## fastclime                     7.760447e-05
## wikipediatrend                7.760429e-05
## tractor.base                  7.758355e-05
## acebayes                      7.758047e-05
## spec                          7.755635e-05
## SpatMCA                       7.754254e-05
## parma                         7.751841e-05
## largeVis                      7.750850e-05
## qtlnet                        7.750402e-05
## regpro                        7.748822e-05
## mvoutlier                     7.748600e-05
## swirl                         7.745506e-05
## microplot                     7.743617e-05
## BLPestimatoR                  7.737964e-05
## rsample                       7.737723e-05
## RVFam                         7.737400e-05
## miscset                       7.737206e-05
## TSsdmx                        7.737137e-05
## pillar                        7.734270e-05
## prospectr                     7.732799e-05
## XMRF                          7.729067e-05
## Rmpi                          7.727312e-05
## RMRAINGEN                     7.726101e-05
## rpg                           7.725702e-05
## finch                         7.724133e-05
## ORCI                          7.722669e-05
## DBItest                       7.718491e-05
## spls                          7.718250e-05
## crqa                          7.717156e-05
## multcompView                  7.716793e-05
## BVSNLP                        7.715020e-05
## aSPU                          7.714700e-05
## carSurv                       7.713222e-05
## eulerr                        7.711983e-05
## RHRV                          7.710522e-05
## factorcpt                     7.710520e-05
## optimr                        7.708410e-05
## timeseriesdb                  7.706968e-05
## smapr                         7.706944e-05
## RPresto                       7.706183e-05
## kimisc                        7.705900e-05
## fossil                        7.704963e-05
## anipaths                      7.704833e-05
## lokern                        7.704409e-05
## wCorr                         7.702720e-05
## gunsales                      7.701053e-05
## editrules                     7.700499e-05
## CollocInfer                   7.700351e-05
## JAGUAR                        7.700074e-05
## WriteXLS                      7.699255e-05
## RMariaDB                      7.698931e-05
## meteo                         7.698319e-05
## svUnit                        7.697141e-05
## gamlss.add                    7.693785e-05
## meltt                         7.689892e-05
## net.security                  7.689728e-05
## scam                          7.687496e-05
## plsVarSel                     7.686935e-05
## tmod                          7.686209e-05
## MM                            7.684882e-05
## CNLTreg                       7.683582e-05
## document                      7.682763e-05
## NNTbiomarker                  7.681857e-05
## ROptEst                       7.680998e-05
## mutoss                        7.679555e-05
## org.Hs.eg.db                  7.678950e-05
## discretecdAlgorithm           7.678873e-05
## lsbclust                      7.677626e-05
## MNM                           7.677373e-05
## siar                          7.677029e-05
## Gmedian                       7.671726e-05
## BradleyTerryScalable          7.668667e-05
## linprog                       7.667709e-05
## RSQLServer                    7.667231e-05
## MetaPath                      7.666326e-05
## SimReg                        7.666198e-05
## preprosim                     7.664044e-05
## explor                        7.663636e-05
## regclass                      7.662270e-05
## ludic                         7.661821e-05
## quadrupen                     7.659544e-05
## movMF                         7.656888e-05
## dlmap                         7.656513e-05
## graphTweets                   7.656379e-05
## FSelectorRcpp                 7.655543e-05
## SmartSVA                      7.654956e-05
## DWreg                         7.652161e-05
## import                        7.652067e-05
## CorrToolBox                   7.651914e-05
## gimms                         7.651697e-05
## datapack                      7.649888e-05
## mvord                         7.649790e-05
## xLLiM                         7.649399e-05
## bigrquery                     7.648228e-05
## groc                          7.647813e-05
## diffrprojectswidget           7.640763e-05
## cncaGUI                       7.640422e-05
## pinbasic                      7.639983e-05
## deconstructSigs               7.639545e-05
## season                        7.638114e-05
## kineticF                      7.637043e-05
## shrink                        7.636982e-05
## BiocInstaller                 7.636289e-05
## RSNNS                         7.636198e-05
## ggmcmc                        7.635426e-05
## pomp                          7.634506e-05
## routr                         7.631813e-05
## NanoStringNorm                7.631504e-05
## SensusR                       7.624658e-05
## GWmodel                       7.623746e-05
## PNADcIBGE                     7.622834e-05
## IsoGene                       7.621691e-05
## msaenet                       7.621207e-05
## tsoutliers                    7.620522e-05
## ImputeRobust                  7.618237e-05
## lmeresampler                  7.618157e-05
## beadarrayMSV                  7.616118e-05
## marelac                       7.614478e-05
## IsoriX                        7.605741e-05
## WebGestaltR                   7.601808e-05
## tesseract                     7.600208e-05
## kehra                         7.597567e-05
## skynet                        7.596023e-05
## MatrixModels                  7.595617e-05
## openSTARS                     7.594079e-05
## CCTpack                       7.592455e-05
## BTSPAS                        7.589790e-05
## CNLTtsa                       7.587551e-05
## mclcar                        7.585391e-05
## random.polychor.pa            7.584161e-05
## Bayesthresh                   7.580810e-05
## WRS2                          7.580090e-05
## treeplyr                      7.578844e-05
## testthis                      7.578051e-05
## compositions                  7.578019e-05
## HiveR                         7.575274e-05
## rorcid                        7.574523e-05
## request                       7.573512e-05
## rsMove                        7.573332e-05
## remote                        7.573108e-05
## uptasticsearch                7.572049e-05
## gcite                         7.570140e-05
## tabularaster                  7.569226e-05
## neotoma                       7.568908e-05
## phenology                     7.564846e-05
## likert                        7.561042e-05
## bigmemory.sri                 7.560764e-05
## rWBclimate                    7.559663e-05
## plotGoogleMaps                7.558457e-05
## NetworkInference              7.557669e-05
## CBPS                          7.557174e-05
## Knoema                        7.557079e-05
## BEDMatrix                     7.555913e-05
## awsMethods                    7.553445e-05
## tourrGui                      7.552826e-05
## prophet                       7.551823e-05
## markmyassignment              7.547850e-05
## wrswoR                        7.546250e-05
## GameTheory                    7.546036e-05
## xmeta                         7.544811e-05
## geojson                       7.544305e-05
## relsurv                       7.543749e-05
## ritis                         7.542558e-05
## MSBVAR                        7.540616e-05
## httk                          7.538627e-05
## IDPmisc                       7.537719e-05
## fgui                          7.537332e-05
## EGRET                         7.536993e-05
## EasyHTMLReport                7.531690e-05
## BGLR                          7.531356e-05
## projpred                      7.530321e-05
## climdex.pcic                  7.529385e-05
## shinyFiles                    7.528478e-05
## lwgeom                        7.527579e-05
## metamisc                      7.526117e-05
## SpaCCr                        7.525155e-05
## G2Sd                          7.522130e-05
## dlstats                       7.520506e-05
## MRFA                          7.518991e-05
## condir                        7.518777e-05
## randomForestSRC               7.518375e-05
## iDINGO                        7.511364e-05
## palm                          7.511048e-05
## link2GI                       7.509161e-05
## gmnl                          7.505345e-05
## frontier                      7.504281e-05
## EBMAforecast                  7.503955e-05
## OptimaRegion                  7.503131e-05
## europepmc                     7.503035e-05
## missForest                    7.502497e-05
## geogrid                       7.502482e-05
## bootcluster                   7.499448e-05
## equateMultiple                7.498202e-05
## datamart                      7.496768e-05
## lawstat                       7.495418e-05
## qrcm                          7.494262e-05
## rrr                           7.493009e-05
## dMod                          7.491539e-05
## ImportExport                  7.487674e-05
## accSDA                        7.486749e-05
## SeqGrapheR                    7.484490e-05
## STMedianPolish                7.483959e-05
## pre                           7.483422e-05
## sutteForecastR                7.479646e-05
## MortalitySmooth               7.479593e-05
## bnclassify                    7.478829e-05
## rPref                         7.477945e-05
## contrast                      7.477694e-05
## x12GUI                        7.474268e-05
## BASiNET                       7.472263e-05
## dr                            7.466565e-05
## rsdmx                         7.464298e-05
## flextable                     7.462937e-05
## midasr                        7.458906e-05
## camtrapR                      7.458888e-05
## convoSPAT                     7.458602e-05
## CEGO                          7.458380e-05
## rdrop2                        7.456192e-05
## mGSZ                          7.454375e-05
## RSurvey                       7.453982e-05
## McSpatial                     7.453916e-05
## TSstudio                      7.452520e-05
## MANOVA.RM                     7.450601e-05
## AHR                           7.446554e-05
## nat.nblast                    7.445208e-05
## gutenbergr                    7.443216e-05
## spass                         7.441104e-05
## rapportools                   7.441086e-05
## timelineR                     7.439976e-05
## caffsim                       7.434096e-05
## HiCfeat                       7.432085e-05
## doMC                          7.431939e-05
## MoEClust                      7.431459e-05
## DataExplorer                  7.431459e-05
## miic                          7.423403e-05
## ropercenter                   7.423079e-05
## CITAN                         7.418815e-05
## frailtySurv                   7.418645e-05
## JSM                           7.418527e-05
## BiocGenerics                  7.417711e-05
## msltrend                      7.417206e-05
## idm                           7.415340e-05
## kpcalg                        7.413937e-05
## geomnet                       7.413577e-05
## citr                          7.411508e-05
## dynamo                        7.408049e-05
## wrapr                         7.405970e-05
## Cubist                        7.403979e-05
## Bergm                         7.402352e-05
## mfe                           7.401775e-05
## RcppZiggurat                  7.400338e-05
## clustree                      7.399046e-05
## BatchGetSymbols               7.397689e-05
## dcmle                         7.397180e-05
## nontarget                     7.391575e-05
## postGIStools                  7.389872e-05
## warpMix                       7.388219e-05
## evidence                      7.387266e-05
## geno2proteo                   7.384638e-05
## stR                           7.383742e-05
## qvcalc                        7.382018e-05
## robustrao                     7.380803e-05
## EMCluster                     7.380504e-05
## bisoreg                       7.380310e-05
## FSTpackage                    7.379972e-05
## InPosition                    7.379366e-05
## TExPosition                   7.379366e-05
## auk                           7.378442e-05
## tidygenomics                  7.377199e-05
## crmPack                       7.376646e-05
## stmgui                        7.375863e-05
## model4you                     7.374735e-05
## uplift                        7.368039e-05
## FastGP                        7.367581e-05
## MALDIrppa                     7.366976e-05
## Mediana                       7.364405e-05
## kutils                        7.364089e-05
## MADPop                        7.364078e-05
## R330                          7.363017e-05
## geophys                       7.361672e-05
## rBayesianOptimization         7.361187e-05
## DynTxRegime                   7.360634e-05
## SIMMS                         7.357669e-05
## sisal                         7.356727e-05
## pangaear                      7.356575e-05
## svgViewR                      7.356025e-05
## GLMaSPU                       7.354951e-05
## tangram                       7.354181e-05
## hydrolinks                    7.351967e-05
## forestFloor                   7.350196e-05
## IRTpp                         7.348691e-05
## stampr                        7.348326e-05
## histogram                     7.346350e-05
## understandBPMN                7.345616e-05
## SmarterPoland                 7.342501e-05
## vioplot                       7.338726e-05
## BCSub                         7.337127e-05
## aop                           7.335152e-05
## condSURV                      7.331668e-05
## astsa                         7.328439e-05
## SNSequate                     7.326663e-05
## fauxpas                       7.321214e-05
## FRCC                          7.319435e-05
## tukeytrend                    7.318778e-05
## pitchRx                       7.317599e-05
## widyr                         7.317371e-05
## enaR                          7.316312e-05
## dkanr                         7.313803e-05
## osrm                          7.311232e-05
## VarfromPDB                    7.309347e-05
## superheat                     7.306815e-05
## mvMORPH                       7.306553e-05
## binequality                   7.305936e-05
## LLSR                          7.305779e-05
## epitrix                       7.304998e-05
## shinycssloaders               7.304275e-05
## dagitty                       7.303397e-05
## steadyICA                     7.302896e-05
## ztype                         7.300301e-05
## qlcMatrix                     7.300193e-05
## DrBats                        7.298295e-05
## ebmc                          7.294615e-05
## rotations                     7.289982e-05
## sadists                       7.287934e-05
## dynsurv                       7.287023e-05
## benchmarkme                   7.286313e-05
## BClustLonG                    7.282441e-05
## restfulr                      7.282188e-05
## vegdata                       7.281624e-05
## BeSS                          7.281233e-05
## googleLanguageR               7.279737e-05
## TESS                          7.275982e-05
## pifpaf                        7.274868e-05
## carx                          7.274645e-05
## tmle.npvi                     7.274281e-05
## lmmpar                        7.272308e-05
## VideoComparison               7.268882e-05
## aws.polly                     7.267817e-05
## optparse                      7.265188e-05
## survSNP                       7.263885e-05
## getCRUCLdata                  7.262998e-05
## pRF                           7.262229e-05
## IsingFit                      7.260174e-05
## lefse                         7.255997e-05
## polymapR                      7.255272e-05
## episode                       7.253494e-05
## st                            7.251519e-05
## nlsem                         7.248811e-05
## fuzzyjoin                     7.247899e-05
## GWLelast                      7.247236e-05
## ReIns                         7.245772e-05
## sparr                         7.242818e-05
## integIRTy                     7.242562e-05
## seacarb                       7.240662e-05
## rbefdata                      7.240556e-05
## TPEA                          7.238489e-05
## copCAR                        7.237911e-05
## rdefra                        7.237887e-05
## Brundle                       7.237373e-05
## worldmet                      7.235673e-05
## Counterfactual                7.235036e-05
## freqweights                   7.234443e-05
## playwith                      7.233826e-05
## flars                         7.233191e-05
## reda                          7.231646e-05
## xlsxjars                      7.230186e-05
## constrainedKriging            7.230101e-05
## sapa                          7.230087e-05
## DAISIE                        7.228714e-05
## CrypticIBDcheck               7.226711e-05
## difNLR                        7.226470e-05
## vegtable                      7.225582e-05
## fastdigest                    7.222740e-05
## LSPFP                         7.222310e-05
## logcondens                    7.221443e-05
## settings                      7.221437e-05
## corr2D                        7.219966e-05
## inaparc                       7.219396e-05
## mdmb                          7.212803e-05
## dnr                           7.208312e-05
## readMzXmlData                 7.206960e-05
## clusterSEs                    7.203448e-05
## rrecsys                       7.202272e-05
## glmx                          7.199329e-05
## antaresRead                   7.198033e-05
## futile.matrix                 7.191195e-05
## eiPack                        7.190195e-05
## twang                         7.190090e-05
## sda                           7.187730e-05
## robustloggamma                7.187517e-05
## flux                          7.186380e-05
## SELF                          7.185359e-05
## CTT                           7.185279e-05
## snipEM                        7.185222e-05
## cctools                       7.184420e-05
## gWQS                          7.183906e-05
## ROI.plugin.clp                7.183742e-05
## rgrass7                       7.182390e-05
## RADami                        7.180992e-05
## parsemsf                      7.180182e-05
## ewoc                          7.179575e-05
## PCPS                          7.177260e-05
## smerc                         7.174540e-05
## REDCapR                       7.173715e-05
## JBTools                       7.172827e-05
## sbfc                          7.170996e-05
## processmonitR                 7.170981e-05
## DREGAR                        7.170341e-05
## RNAsmc                        7.170341e-05
## mFilter                       7.170341e-05
## nutshell.audioscrobbler       7.170341e-05
## nutshell.bbdb                 7.170341e-05
## rivernet                      7.170341e-05
## squash                        7.170341e-05
## Tides                         7.170341e-05
## utility                       7.170341e-05
## copynumber                    7.170341e-05
## RNAstructureModuleMiner       7.170341e-05
## SmoothWin                     7.170341e-05
## PIGE                          7.169714e-05
## gensphere                     7.161268e-05
## unbalanced                    7.160144e-05
## prototest                     7.157781e-05
## Rvcg                          7.157590e-05
## libcoin                       7.155864e-05
## nadiv                         7.154185e-05
## rvinecopulib                  7.152981e-05
## bdots                         7.152373e-05
## assertive.numbers             7.152079e-05
## CorrBin                       7.150790e-05
## RaPKod                        7.150151e-05
## random                        7.149453e-05
## webutils                      7.146796e-05
## mcmcplots                     7.146555e-05
## compare                       7.145546e-05
## BayesComm                     7.145222e-05
## visdat                        7.143753e-05
## bcROCsurface                  7.142427e-05
## predictmeans                  7.142419e-05
## giphyr                        7.142399e-05
## qcr                           7.141037e-05
## pvclust                       7.140873e-05
## predkmeans                    7.139275e-05
## PopVar                        7.138284e-05
## bamdit                        7.137320e-05
## RANKS                         7.136193e-05
## rCBA                          7.131839e-05
## walmartAPI                    7.131460e-05
## ROptEstOld                    7.130475e-05
## serrsBayes                    7.129615e-05
## eyetrackingR                  7.124929e-05
## macleish                      7.124491e-05
## adiv                          7.122354e-05
## lqmm                          7.117447e-05
## SMPracticals                  7.117253e-05
## MSCMT                         7.113614e-05
## stochvol                      7.112755e-05
## lle                           7.110095e-05
## bingat                        7.109939e-05
## quickmatch                    7.109656e-05
## intergraph                    7.108597e-05
## HDtest                        7.106663e-05
## CepLDA                        7.106350e-05
## HRM                           7.106084e-05
## STAR                          7.105769e-05
## pcrsim                        7.105494e-05
## autovarCore                   7.104977e-05
## SCGLR                         7.104895e-05
## rPython                       7.102083e-05
## LOGIT                         7.101721e-05
## qqman                         7.100818e-05
## CatPredi                      7.099486e-05
## Rpolyhedra                    7.099145e-05
## synchronicity                 7.098773e-05
## kergp                         7.097775e-05
## SpatialExtremes               7.096614e-05
## sensiPhy                      7.092812e-05
## pbdZMQ                        7.091305e-05
## bst                           7.091117e-05
## mutSignatures                 7.089692e-05
## agriTutorial                  7.088921e-05
## kde1d                         7.088849e-05
## ClustOfVar                    7.088594e-05
## PearsonDS                     7.086748e-05
## nmslibR                       7.086380e-05
## perccalc                      7.085846e-05
## orloca                        7.081578e-05
## cytometree                    7.078884e-05
## semsfa                        7.078354e-05
## sparsebnUtils                 7.076205e-05
## d3Network                     7.076159e-05
## easyformatr                   7.076053e-05
## ballr                         7.075314e-05
## SphericalCubature             7.074637e-05
## mnlogit                       7.074383e-05
## survtmle                      7.074266e-05
## ctmcd                         7.073348e-05
## codemetar                     7.068557e-05
## ttScreening                   7.068552e-05
## capushe                       7.068373e-05
## MFHD                          7.067990e-05
## ZOIP                          7.065849e-05
## wgeesel                       7.062702e-05
## apsimr                        7.060765e-05
## summarytools                  7.059744e-05
## gptk                          7.058117e-05
## ILS                           7.057694e-05
## nat.templatebrains            7.056116e-05
## rcure                         7.054302e-05
## spm12r                        7.053437e-05
## rggobi                        7.051211e-05
## GENEAclassify                 7.049206e-05
## brlrmr                        7.047550e-05
## pgraph                        7.047476e-05
## maxent                        7.047357e-05
## acs                           7.045183e-05
## JGR                           7.043443e-05
## AHMbook                       7.042673e-05
## arc                           7.042427e-05
## psd                           7.041437e-05
## gh                            7.041350e-05
## baitmet                       7.041096e-05
## pedometrics                   7.039216e-05
## R2Cuba                        7.038980e-05
## squid                         7.037750e-05
## LS2Wstat                      7.037139e-05
## sidier                        7.035138e-05
## beeswarm                      7.034550e-05
## DirichletReg                  7.034453e-05
## PerfMeas                      7.034099e-05
## TED                           7.032745e-05
## PBSmodelling                  7.031367e-05
## SanFranBeachWater             7.029814e-05
## tvR                           7.028642e-05
## quickReg                      7.027891e-05
## shock                         7.027019e-05
## nor1mix                       7.022006e-05
## kml3d                         7.021825e-05
## recluster                     7.021334e-05
## PRIMsrc                       7.015861e-05
## qrmtools                      7.015547e-05
## HighDimOut                    7.014715e-05
## spmoran                       7.013921e-05
## ic.infer                      7.013880e-05
## rJython                       7.013145e-05
## fuzzyforest                   7.012224e-05
## ldatuning                     7.009438e-05
## ADMM                          7.008862e-05
## SLOPE                         7.008752e-05
## CompetingRisk                 7.007755e-05
## fdq                           7.006888e-05
## elevatr                       7.006530e-05
## svgPanZoom                    7.006404e-05
## penalizedLDA                  7.006174e-05
## trip                          7.004942e-05
## REIDS                         7.003744e-05
## LTRCtrees                     7.003677e-05
## processx                      7.002336e-05
## scatr                         7.001799e-05
## fmsb                          6.999321e-05
## languageserver                6.999234e-05
## MM2S                          6.999096e-05
## SkewHyperbolic                6.998517e-05
## intsvy                        6.998489e-05
## DstarM                        6.997880e-05
## SISIR                         6.993364e-05
## interp                        6.991542e-05
## mhurdle                       6.991434e-05
## pems.utils                    6.990931e-05
## imp4p                         6.990678e-05
## ontologyIndex                 6.990136e-05
## BayesX                        6.986742e-05
## archivist.github              6.985654e-05
## FPV                           6.983290e-05
## FuzzyNumbers.Ext.2            6.983290e-05
## HEMDAG                        6.982661e-05
## fpp                           6.982265e-05
## pedantics                     6.979722e-05
## yhat                          6.978397e-05
## ASICS                         6.977834e-05
## m2b                           6.977792e-05
## plotSEMM                      6.975463e-05
## pedgene                       6.974816e-05
## qrfactor                      6.972400e-05
## metafolio                     6.971481e-05
## Sim.DiffProc                  6.969109e-05
## ICsurv                        6.966287e-05
## EpiCurve                      6.966048e-05
## NCA                           6.964840e-05
## gcbd                          6.964044e-05
## MixSim                        6.959716e-05
## TailRank                      6.959259e-05
## sideChannelAttack             6.957500e-05
## TSSQLite                      6.957310e-05
## FuzzyLP                       6.956927e-05
## hdi                           6.955797e-05
## aftgee                        6.954143e-05
## rriskDistributions            6.953783e-05
## robustgam                     6.952487e-05
## MasterBayes                   6.950124e-05
## lslx                          6.947872e-05
## APSIM                         6.947450e-05
## bfast                         6.945963e-05
## ipft                          6.944332e-05
## saeSim                        6.944033e-05
## CausalImpact                  6.938996e-05
## robotstxt                     6.937843e-05
## PubMedWordcloud               6.937053e-05
## AmostraBrasil                 6.936506e-05
## rfPermute                     6.936017e-05
## secrlinear                    6.935944e-05
## growcurves                    6.934506e-05
## switchnpreg                   6.932098e-05
## GeneralizedUmatrix            6.931676e-05
## markophylo                    6.931126e-05
## monomvn                       6.929516e-05
## ini                           6.927394e-05
## ANOM                          6.926536e-05
## IIS                           6.926139e-05
## getmstatistic                 6.923850e-05
## xergm.common                  6.922713e-05
## PUlasso                       6.921093e-05
## bc3net                        6.920787e-05
## wrspathrow                    6.920331e-05
## gamreg                        6.918944e-05
## prrd                          6.917259e-05
## sinew                         6.914201e-05
## scatterD3                     6.912284e-05
## angstroms                     6.911732e-05
## rrcovNA                       6.911178e-05
## BradleyTerry2                 6.911149e-05
## npphen                        6.910481e-05
## data.world                    6.909643e-05
## DiffusionRgqd                 6.909131e-05
## DiffusionRimp                 6.909131e-05
## DiffusionRjgqd                6.909131e-05
## RMark                         6.908264e-05
## missMDA                       6.907598e-05
## autoimage                     6.906396e-05
## geojsonlint                   6.905243e-05
## tribe                         6.904263e-05
## snplist                       6.904157e-05
## dr4pl                         6.903427e-05
## ENMeval                       6.903377e-05
## perARMA                       6.899940e-05
## VarSelLCM                     6.899766e-05
## sampSurf                      6.899119e-05
## R.rsp                         6.897233e-05
## dse                           6.894487e-05
## EvalEst                       6.894487e-05
## gskat                         6.894107e-05
## rebus.datetimes               6.892823e-05
## rebus.numbers                 6.892823e-05
## rebus.unicode                 6.892823e-05
## metaBMA                       6.892725e-05
## reader                        6.888469e-05
## regtools                      6.887647e-05
## ada                           6.886480e-05
## reutils                       6.883141e-05
## eeptools                      6.883028e-05
## rts                           6.881436e-05
## multilevel                    6.880138e-05
## metaMix                       6.879205e-05
## magclass                      6.878398e-05
## PPtreeViz                     6.878135e-05
## GIGrvg                        6.875730e-05
## MonoInc                       6.873380e-05
## MetaComp                      6.869963e-05
## networkR                      6.869305e-05
## monographaR                   6.866688e-05
## Xplortext                     6.866212e-05
## ilc                           6.863990e-05
## genlasso                      6.862848e-05
## edgar                         6.861949e-05
## gge                           6.861859e-05
## blockseg                      6.857923e-05
## translate                     6.857026e-05
## bpnreg                        6.855763e-05
## rtkore                        6.854712e-05
## vegan3d                       6.849900e-05
## covr                          6.848193e-05
## snht                          6.843725e-05
## gbp                           6.841693e-05
## mcompanion                    6.839500e-05
## tabplotd3                     6.838781e-05
## observer                      6.837748e-05
## orderedLasso                  6.836018e-05
## ctsem                         6.833208e-05
## DataVisualizations            6.833001e-05
## EmiStatR                      6.830482e-05
## plumber                       6.830345e-05
## dtree                         6.829411e-05
## ForestTools                   6.827368e-05
## palaeoSig                     6.826732e-05
## NHMSAR                        6.825616e-05
## microseq                      6.824920e-05
## predtoolsTS                   6.824601e-05
## hglasso                       6.824217e-05
## glmpath                       6.823934e-05
## TLBC                          6.822582e-05
## fExoticOptions                6.821723e-05
## distcrete                     6.821475e-05
## pssm                          6.820567e-05
## bigtabulate                   6.820002e-05
## polspline                     6.819907e-05
## conting                       6.819003e-05
## GENEAsphere                   6.815291e-05
## simex                         6.815184e-05
## fICA                          6.810377e-05
## rmdformats                    6.810349e-05
## emoa                          6.809771e-05
## finreportr                    6.808972e-05
## reportr                       6.808936e-05
## DrugClust                     6.807781e-05
## brranching                    6.807076e-05
## vines                         6.802828e-05
## ordBTL                        6.802480e-05
## fishmethods                   6.801742e-05
## MAd                           6.801601e-05
## PMA                           6.798673e-05
## parfm                         6.797089e-05
## patternize                    6.796353e-05
## BinNonNor                     6.796018e-05
## GUniFrac                      6.795781e-05
## MiRKAT                        6.792864e-05
## stocc                         6.792839e-05
## rncl                          6.791134e-05
## daewr                         6.786397e-05
## prettymapr                    6.786060e-05
## getPass                       6.785046e-05
## dwapi                         6.783266e-05
## BEQI2                         6.779277e-05
## micEcon                       6.779192e-05
## corregp                       6.776194e-05
## DGM                           6.775478e-05
## multdyn                       6.775478e-05
## nnfor                         6.773031e-05
## lg                            6.769472e-05
## dc3net                        6.766756e-05
## multicon                      6.765069e-05
## StructFDR                     6.765056e-05
## mvSLOUCH                      6.763503e-05
## shotGroups                    6.762582e-05
## aws.alexa                     6.762373e-05
## AmigaFFH                      6.762075e-05
## selectr                       6.761556e-05
## Information                   6.760453e-05
## optimbase                     6.757729e-05
## GeNetIt                       6.757236e-05
## bigFastlm                     6.757216e-05
## PCGSE                         6.755520e-05
## GGEBiplots                    6.755393e-05
## colorscience                  6.754987e-05
## crossword.r                   6.754671e-05
## Rssa                          6.754566e-05
## cancerGI                      6.754021e-05
## zFactor                       6.752777e-05
## plogr                         6.751753e-05
## stdReg                        6.750616e-05
## support.CEs                   6.750382e-05
## funbarRF                      6.749927e-05
## ResourceSelection             6.748191e-05
## ibd                           6.747416e-05
## placement                     6.747311e-05
## envlpaster                    6.744506e-05
## PGRdup                        6.743101e-05
## sdprisk                       6.742876e-05
## bayeslm                       6.742608e-05
## vstsr                         6.741136e-05
## soc.ca                        6.740648e-05
## ldbounds                      6.740173e-05
## Rcrawler                      6.740035e-05
## IsotopeR                      6.739712e-05
## munsell                       6.739165e-05
## unsystation                   6.738615e-05
## depth                         6.738583e-05
## GBJ                           6.736911e-05
## kelvin                        6.736274e-05
## diseasemapping                6.735240e-05
## decisionSupport               6.734129e-05
## R2GUESS                       6.734015e-05
## drfit                         6.733859e-05
## hutils                        6.733534e-05
## abbyyR                        6.732897e-05
## spup                          6.729501e-05
## SNPassoc                      6.728436e-05
## gromovlab                     6.726562e-05
## heims                         6.726337e-05
## outbreaker2                   6.725437e-05
## exp2flux                      6.724739e-05
## tm.plugin.dc                  6.724588e-05
## lba                           6.724131e-05
## rankdist                      6.723922e-05
## rodd                          6.723192e-05
## extraDistr                    6.721304e-05
## dalmatian                     6.719796e-05
## pkgconfig                     6.719657e-05
## cghRA                         6.719245e-05
## RSiteCatalyst                 6.719195e-05
## mbest                         6.718770e-05
## face                          6.718144e-05
## KGode                         6.717990e-05
## ROI.plugin.ecos               6.717774e-05
## mRchmadness                   6.717449e-05
## ald                           6.717358e-05
## bmem                          6.716275e-05
## pbdDMAT                       6.714275e-05
## stepPenal                     6.711210e-05
## MetFns                        6.710794e-05
## hergm                         6.709585e-05
## mut                           6.709534e-05
## prettyunits                   6.709425e-05
## htmltidy                      6.709008e-05
## lmem.qtler                    6.704074e-05
## elliptic                      6.699857e-05
## later                         6.696903e-05
## OrdNor                        6.696117e-05
## PoisBinOrdNonNor              6.696063e-05
## MBSGS                         6.695967e-05
## DPWeibull                     6.692095e-05
## HierO                         6.691494e-05
## gamlss.spatial                6.689360e-05
## HPbayes                       6.686078e-05
## BDgraph                       6.684700e-05
## mclogit                       6.684580e-05
## DSAIDE                        6.684484e-05
## GISTools                      6.684060e-05
## jcext                         6.683126e-05
## IceCast                       6.680473e-05
## webchem                       6.678685e-05
## MBHdesign                     6.678634e-05
## MAPA                          6.678263e-05
## PPtree                        6.677590e-05
## fslr                          6.675690e-05
## likeLTD                       6.672707e-05
## ATmet                         6.669393e-05
## LaF                           6.668290e-05
## mathpix                       6.668079e-05
## cffdrs                        6.667962e-05
## quickpsy                      6.667157e-05
## spbabel                       6.664375e-05
## rstansim                      6.664268e-05
## psychomix                     6.663434e-05
## wicket                        6.662751e-05
## goric                         6.662612e-05
## rex                           6.661841e-05
## COMBIA                        6.660853e-05
## epicontacts                   6.660119e-05
## swatches                      6.659292e-05
## SVMMaj                        6.659162e-05
## ggiraph                       6.657368e-05
## mvProbit                      6.656590e-05
## CoordinateCleaner             6.656027e-05
## yorkr                         6.654599e-05
## imputeTS                      6.653540e-05
## gWidgetstcltk                 6.653470e-05
## AnnuityRIR                    6.652540e-05
## repijson                      6.650726e-05
## ggenealogy                    6.650492e-05
## covTest                       6.648966e-05
## dmm                           6.648004e-05
## psidR                         6.647561e-05
## WeightedCluster               6.647487e-05
## GetLattesData                 6.644926e-05
## HoRM                          6.644171e-05
## ASMap                         6.642349e-05
## stlplus                       6.641301e-05
## TreePar                       6.639963e-05
## AnalyzeFMRI                   6.639539e-05
## lazyrmd                       6.639122e-05
## mldr                          6.638907e-05
## linear.tools                  6.633765e-05
## dggridR                       6.632858e-05
## DALEX                         6.632061e-05
## pdSpecEst                     6.631572e-05
## clusteredinterference         6.631282e-05
## CNull                         6.631003e-05
## maxadjAUC                     6.627604e-05
## superbiclust                  6.627148e-05
## traj                          6.622384e-05
## adaptsmoFMRI                  6.622330e-05
## rstantools                    6.621953e-05
## rsggm                         6.621610e-05
## cSFM                          6.620339e-05
## biolink                       6.618445e-05
## tidystringdist                6.617783e-05
## robustsae                     6.616633e-05
## gmailr                        6.614477e-05
## dtplyr                        6.613896e-05
## ahaz                          6.612811e-05
## sdols                         6.612086e-05
## shallot                       6.612086e-05
## vmd                           6.609591e-05
## encode                        6.607703e-05
## crminer                       6.607080e-05
## pivottabler                   6.605748e-05
## OceanView                     6.605531e-05
## CDVine                        6.604307e-05
## flan                          6.604023e-05
## qwraps2                       6.595419e-05
## ri2                           6.595182e-05
## disclapmix                    6.594515e-05
## sitree                        6.592493e-05
## TimeSeries.OBeu               6.591537e-05
## WiSEBoot                      6.591113e-05
## freqdom                       6.590361e-05
## RClickhouse                   6.589893e-05
## BaTFLED3D                     6.589221e-05
## Runuran                       6.587689e-05
## clhs                          6.586400e-05
## StratSel                      6.585048e-05
## vcdExtra                      6.584492e-05
## arulesCBA                     6.583820e-05
## FREddyPro                     6.583145e-05
## iFad                          6.582222e-05
## flexdashboard                 6.582031e-05
## eyelinker                     6.580397e-05
## ForecastFramework             6.580296e-05
## REPTILE                       6.579849e-05
## rasclass                      6.578577e-05
## lakemorpho                    6.575687e-05
## GetHFData                     6.574599e-05
## rvertnet                      6.573866e-05
## naturalsort                   6.573554e-05
## LocalControl                  6.572732e-05
## orQA                          6.572289e-05
## sys                           6.571190e-05
## BIEN                          6.570402e-05
## rpql                          6.568359e-05
## tvReg                         6.565183e-05
## refimpact                     6.561567e-05
## gaussquad                     6.559981e-05
## ggbeeswarm                    6.559814e-05
## VWPre                         6.558041e-05
## plot3Drgl                     6.556641e-05
## rakeR                         6.554658e-05
## InSilicoVA                    6.554248e-05
## re2r                          6.553303e-05
## qicharts                      6.552754e-05
## RcppRedis                     6.549364e-05
## simmer.plot                   6.548785e-05
## nardl                         6.548757e-05
## poplite                       6.547302e-05
## diveMove                      6.547242e-05
## LGEWIS                        6.546178e-05
## sdcTarget                     6.545944e-05
## Publish                       6.545666e-05
## netgsa                        6.545264e-05
## iadf                          6.544475e-05
## daymetr                       6.542036e-05
## MPTinR                        6.540550e-05
## lans2r                        6.540179e-05
## pcaPA                         6.540017e-05
## isni                          6.537665e-05
## dualScale                     6.535696e-05
## geospacom                     6.534186e-05
## HARtools                      6.533482e-05
## macc                          6.531467e-05
## icesSAG                       6.531367e-05
## crqanlp                       6.527922e-05
## LSC                           6.527889e-05
## EurosarcBayes                 6.527829e-05
## dave                          6.525846e-05
## MIIVsem                       6.523901e-05
## motmot.2.0                    6.523395e-05
## tclust                        6.523289e-05
## wasim                         6.521678e-05
## scholar                       6.518570e-05
## restlos                       6.516635e-05
## bios2mds                      6.514080e-05
## Rmosek                        6.513190e-05
## ebimetagenomics               6.507265e-05
## LabourMarketAreas             6.506417e-05
## crosswalkr                    6.505016e-05
## BDWreg                        6.502893e-05
## timevis                       6.502726e-05
## refGenome                     6.499620e-05
## ggRandomForests               6.499523e-05
## PeakSegJoint                  6.498744e-05
## zoib                          6.498651e-05
## jsonld                        6.498066e-05
## PoisBinOrdNor                 6.495819e-05
## NeuralNetTools                6.494346e-05
## s20x                          6.493700e-05
## svdvis                        6.493637e-05
## iCluster                      6.492662e-05
## tropr                         6.492101e-05
## aucm                          6.486371e-05
## spBayes                       6.483792e-05
## MultiLCIRT                    6.483676e-05
## epiDisplay                    6.479497e-05
## mixAK                         6.477761e-05
## dynsbm                        6.477341e-05
## carcass                       6.476144e-05
## infer                         6.472816e-05
## metaforest                    6.472775e-05
## rpostgis                      6.469917e-05
## hashmap                       6.469326e-05
## bayespref                     6.467496e-05
## MDSMap                        6.466862e-05
## MultiOrd                      6.466661e-05
## kmer                          6.466429e-05
## rusk                          6.465599e-05
## rEMM                          6.465374e-05
## Rchoice                       6.464685e-05
## gitgadget                     6.458695e-05
## cnmlcd                        6.457500e-05
## npsurv                        6.457500e-05
## nspmix                        6.457500e-05
## gMWT                          6.456622e-05
## chngpt                        6.456540e-05
## HMPTrees                      6.452643e-05
## koRpus.lang.en                6.450316e-05
## BigQuic                       6.449560e-05
## BAT                           6.442305e-05
## shinyWidgets                  6.441469e-05
## camel                         6.441239e-05
## SYNCSA                        6.440638e-05
## pfa                           6.439187e-05
## mtk                           6.438671e-05
## padr                          6.437816e-05
## PortRisk                      6.436833e-05
## CSclone                       6.436756e-05
## SimRAD                        6.436566e-05
## BayesLCA                      6.434688e-05
## BACCO                         6.432770e-05
## cyclocomp                     6.431887e-05
## ess                           6.430878e-05
## harvestr                      6.428030e-05
## longRPart2                    6.427683e-05
## genpathmox                    6.427197e-05
## supc                          6.426994e-05
## MNS                           6.426418e-05
## getlandsat                    6.425369e-05
## survcomp                      6.425297e-05
## heplots                       6.422157e-05
## SQDA                          6.419498e-05
## MetSizeR                      6.415863e-05
## berryFunctions                6.415831e-05
## klausuR                       6.414591e-05
## xfun                          6.413690e-05
## ca                            6.413384e-05
## matrixpls                     6.411993e-05
## enveomics.R                   6.410707e-05
## lavaan.survey                 6.409701e-05
## mipfp                         6.408796e-05
## mixture                       6.405542e-05
## ph2bye                        6.405235e-05
## RcmdrPlugin.SM                6.404525e-05
## robustvarComp                 6.404020e-05
## getopt                        6.401105e-05
## pamm                          6.400777e-05
## MUCflights                    6.397244e-05
## truncreg                      6.397042e-05
## RSCABS                        6.396597e-05
## intercure                     6.396237e-05
## EDFIR                         6.394214e-05
## netassoc                      6.390686e-05
## stabs                         6.390190e-05
## midrangeMCP                   6.388572e-05
## verification                  6.387266e-05
## spdplyr                       6.383134e-05
## medflex                       6.382376e-05
## GenomicMating                 6.382200e-05
## fChange                       6.381838e-05
## BayesRS                       6.381482e-05
## Demerelate                    6.380603e-05
## gdns                          6.379319e-05
## effectFusion                  6.378399e-05
## AnalyzeTS                     6.376046e-05
## GFD                           6.375822e-05
## XML2R                         6.375209e-05
## BBEST                         6.374526e-05
## smoothAPC                     6.374209e-05
## jomo                          6.374039e-05
## diversitree                   6.373721e-05
## KnowBR                        6.373605e-05
## rcongresso                    6.369110e-05
## rgexf                         6.368873e-05
## pavo                          6.368841e-05
## Rmisc                         6.368694e-05
## GPfit                         6.368070e-05
## sparseFLMM                    6.367477e-05
## mudfold                       6.365115e-05
## plfMA                         6.364147e-05
## crch                          6.363799e-05
## cccp                          6.358860e-05
## quipu                         6.358625e-05
## BCEE                          6.358254e-05
## longitudinal                  6.357529e-05
## MAVTgsa                       6.357304e-05
## PBD                           6.356240e-05
## fit4NM                        6.356103e-05
## Stack                         6.355667e-05
## UsingR                        6.355629e-05
## cds                           6.355098e-05
## GOSemSim                      6.353817e-05
## dvmisc                        6.353592e-05
## ENmisc                        6.352182e-05
## interAdapt                    6.350149e-05
## Autoplotprotein               6.349267e-05
## plotprotein                   6.349267e-05
## nonmem2R                      6.349116e-05
## phuse                         6.347606e-05
## ProFound                      6.346793e-05
## bmrm                          6.345437e-05
## samplingbook                  6.345338e-05
## mixlink                       6.345025e-05
## AssayCorrector                6.344809e-05
## qle                           6.344452e-05
## simTool                       6.342341e-05
## voxel                         6.340922e-05
## lexicon                       6.339933e-05
## clustvarsel                   6.337669e-05
## sparsediscrim                 6.336580e-05
## mason                         6.336287e-05
## PINSPlus                      6.335991e-05
## leaflet.esri                  6.335954e-05
## geniusr                       6.335107e-05
## gsheet                        6.333936e-05
## clusterGeneration             6.331974e-05
## rtematres                     6.331460e-05
## textir                        6.330980e-05
## filehashSQLite                6.330580e-05
## lvm4net                       6.328425e-05
## binneR                        6.327606e-05
## apricom                       6.325536e-05
## sRDA                          6.323387e-05
## mstherm                       6.323133e-05
## bsplus                        6.322441e-05
## mcca                          6.322134e-05
## hdm                           6.321401e-05
## DRR                           6.320343e-05
## gWidgets2RGtk2                6.320017e-05
## NipponMap                     6.316993e-05
## ropenaq                       6.315721e-05
## apt                           6.315189e-05
## implyr                        6.315121e-05
## GeoRange                      6.314127e-05
## mitml                         6.312466e-05
## nbpMatching                   6.311818e-05
## survC1                        6.308356e-05
## ggguitar                      6.307333e-05
## structSSI                     6.307191e-05
## leafletCN                     6.306425e-05
## CTTShiny                      6.306192e-05
## freqparcoord                  6.305909e-05
## rmsfuns                       6.305271e-05
## flashClust                    6.302692e-05
## ternvis                       6.296155e-05
## tau                           6.295673e-05
## MHadaptive                    6.294626e-05
## FENmlm                        6.294528e-05
## rdd                           6.291637e-05
## GeoLight                      6.291630e-05
## princurve                     6.291559e-05
## psData                        6.289928e-05
## quantreg.nonpar               6.289570e-05
## qrsvm                         6.289064e-05
## RPtests                       6.289056e-05
## PCovR                         6.288036e-05
## ramps                         6.287399e-05
## FIACH                         6.284638e-05
## RxnSim                        6.283199e-05
## PCICt                         6.282578e-05
## alfred                        6.281444e-05
## fCopulae                      6.280846e-05
## iotables                      6.279281e-05
## TH.data                       6.278812e-05
## pals                          6.278298e-05
## xxIRT                         6.276332e-05
## editData                      6.274664e-05
## PenCoxFrail                   6.274608e-05
## phyloseqGraphTest             6.274224e-05
## gghighlight                   6.273579e-05
## ROCt                          6.272506e-05
## cpgen                         6.271307e-05
## postlightmercury              6.271025e-05
## BullsEyeR                     6.270408e-05
## AurieLSHGaussian              6.266974e-05
## enetLTS                       6.264820e-05
## downscale                     6.262927e-05
## TPmsm                         6.262727e-05
## debugme                       6.261677e-05
## SpecsVerification             6.260277e-05
## MOJOV                         6.258010e-05
## BACA                          6.256789e-05
## lfe                           6.256685e-05
## HBglm                         6.256181e-05
## AID                           6.255662e-05
## SILGGM                        6.253340e-05
## dglm                          6.253327e-05
## optextras                     6.248976e-05
## clusterfly                    6.248928e-05
## RSiena                        6.248776e-05
## waccR                         6.246468e-05
## greta                         6.245910e-05
## arrayhelpers                  6.245390e-05
## aroma.apd                     6.243963e-05
## MTurkR                        6.243436e-05
## ROI.plugin.cplex              6.243431e-05
## PopED                         6.243196e-05
## BIGDAWG                       6.242751e-05
## edrGraphicalTools             6.240810e-05
## ShinyTester                   6.239559e-05
## micropan                      6.238192e-05
## rcicr                         6.237894e-05
## pkr                           6.237535e-05
## lmeNB                         6.236969e-05
## hdlm                          6.234405e-05
## GenKern                       6.229054e-05
## AntWeb                        6.228869e-05
## scoringRules                  6.228650e-05
## spp                           6.228175e-05
## m2r                           6.225684e-05
## syllable                      6.225394e-05
## multistate                    6.223333e-05
## hermite                       6.222543e-05
## hierfstat                     6.221006e-05
## modiscloud                    6.220647e-05
## Directional                   6.218845e-05
## coalescentMCMC                6.218586e-05
## GauPro                        6.216596e-05
## SelvarMix                     6.215038e-05
## csabounds                     6.214233e-05
## neatmaps                      6.213409e-05
## semver                        6.212584e-05
## telegram                      6.210891e-05
## mobForest                     6.210668e-05
## lmmlasso                      6.209531e-05
## RelimpPCR                     6.209477e-05
## RBPcurve                      6.207311e-05
## mfx                           6.207302e-05
## BayLum                        6.202578e-05
## ACDm                          6.202280e-05
## clinDR                        6.201237e-05
## pgee.mixed                    6.199917e-05
## dlm                           6.195925e-05
## origami                       6.195449e-05
## gjam                          6.195388e-05
## latex2exp                     6.195100e-05
## sfdct                         6.192560e-05
## keyring                       6.191764e-05
## gclus                         6.189630e-05
## dHSIC                         6.189549e-05
## subselect                     6.189301e-05
## rJPSGCS                       6.188048e-05
## osrmr                         6.186620e-05
## proj4                         6.186502e-05
## bayesDP                       6.184182e-05
## KFKSDS                        6.183439e-05
## stsm                          6.183439e-05
## mgm                           6.180632e-05
## rClinicalCodes                6.179804e-05
## msr                           6.179610e-05
## bayesSurv                     6.178096e-05
## miRNAss                       6.176342e-05
## PresenceAbsence               6.175653e-05
## akima                         6.173765e-05
## cjoint                        6.173156e-05
## convevol                      6.172144e-05
## VetResearchLMM                6.171803e-05
## FarmSelect                    6.171701e-05
## womblR                        6.171312e-05
## EstHer                        6.169361e-05
## PortfolioEffectHFT            6.168988e-05
## relMix                        6.168356e-05
## ecolMod                       6.167998e-05
## TeachBayes                    6.167929e-05
## httping                       6.167239e-05
## fabia                         6.166953e-05
## cdparcoord                    6.166874e-05
## slimrec                       6.166570e-05
## enviPick                      6.165180e-05
## rmetasim                      6.165029e-05
## quickblock                    6.164871e-05
## rddapp                        6.163647e-05
## RTOMO                         6.162825e-05
## FeedbackTS                    6.161880e-05
## POMaSPU                       6.158915e-05
## SOMbrero                      6.158689e-05
## r6extended                    6.158360e-05
## qdapRegex                     6.157780e-05
## nCal                          6.157465e-05
## symmoments                    6.157419e-05
## GeneNet                       6.156224e-05
## geojsonR                      6.155305e-05
## nmfgpu4R                      6.152472e-05
## GWASinlps                     6.150429e-05
## jsr223                        6.149429e-05
## propr                         6.148655e-05
## ALDqr                         6.148589e-05
## IBHM                          6.146999e-05
## SAENET                        6.146846e-05
## prim                          6.146505e-05
## listenv                       6.145852e-05
## GADAG                         6.145522e-05
## embryogrowth                  6.145272e-05
## epitab                        6.143752e-05
## PowerTOST                     6.143627e-05
## sprm                          6.141449e-05
## miceExt                       6.140901e-05
## NetworkComparisonTest         6.140299e-05
## adimpro                       6.140250e-05
## x.ent                         6.140195e-05
## ProfileLikelihood             6.139760e-05
## sGMRFmix                      6.137643e-05
## hydroPSO                      6.134337e-05
## auRoc                         6.134261e-05
## RLumModel                     6.134064e-05
## ctmcmove                      6.131172e-05
## RcmdrPlugin.sampling          6.129706e-05
## globaltest                    6.129630e-05
## conicfit                      6.129218e-05
## DetR                          6.126143e-05
## varbvs                        6.125760e-05
## slfm                          6.122879e-05
## eventstudies                  6.121497e-05
## LogicForest                   6.120914e-05
## rehh                          6.120768e-05
## timma                         6.119389e-05
## GPvam                         6.118631e-05
## RealVAMS                      6.118631e-05
## lavaan.shiny                  6.118624e-05
## RcmdrPlugin.orloca            6.118279e-05
## estudy2                       6.118201e-05
## cstab                         6.117435e-05
## haploR                        6.117273e-05
## spsann                        6.113719e-05
## BIOMASS                       6.113366e-05
## rare                          6.112777e-05
## tidystats                     6.112214e-05
## dlnm                          6.112118e-05
## wiqid                         6.111479e-05
## trustOptim                    6.106286e-05
## solr                          6.105272e-05
## nlshelper                     6.102200e-05
## tensorr                       6.101555e-05
## GSA                           6.098979e-05
## glpkAPI                       6.097984e-05
## efreadr                       6.097828e-05
## ifaTools                      6.097797e-05
## rpcdsearch                    6.088958e-05
## leapp                         6.088842e-05
## keyplayer                     6.086627e-05
## genlogis                      6.086389e-05
## AdapEnetClass                 6.086221e-05
## measurements                  6.085145e-05
## npbr                          6.085130e-05
## btf                           6.083497e-05
## paleotree                     6.082474e-05
## DSpat                         6.082168e-05
## bedr                          6.079164e-05
## MatrixLDA                     6.078094e-05
## GPC                           6.078053e-05
## twitteR                       6.077568e-05
## breakpoint                    6.074914e-05
## anominate                     6.074789e-05
## alphabetr                     6.072582e-05
## tactile                       6.071985e-05
## kml                           6.070935e-05
## linkcomm                      6.070438e-05
## SolveLS                       6.069807e-05
## VarianceGamma                 6.069385e-05
## MonetDB.R                     6.068011e-05
## evobiR                        6.066276e-05
## elasticIsing                  6.064413e-05
## GSCAD                         6.062125e-05
## edgebundleR                   6.061580e-05
## RGCCA                         6.061087e-05
## treeman                       6.060849e-05
## contoureR                     6.059862e-05
## nmathresh                     6.059844e-05
## FDRreg                        6.058761e-05
## indelmiss                     6.058072e-05
## satscanMapper                 6.056760e-05
## kstIO                         6.056312e-05
## rtiff                         6.055816e-05
## mratios                       6.055474e-05
## AlignStat                     6.055281e-05
## varian                        6.053164e-05
## crmn                          6.052835e-05
## advclust                      6.052367e-05
## Phxnlme                       6.052264e-05
## hyperSpec                     6.049774e-05
## doFuture                      6.049234e-05
## gqlr                          6.048743e-05
## CoxBoost                      6.048570e-05
## deductive                     6.048103e-05
## qmethod                       6.044815e-05
## Renext                        6.044103e-05
## pense                         6.043834e-05
## bigstep                       6.043517e-05
## tripEstimation                6.043058e-05
## slowraker                     6.042085e-05
## TKF                           6.041889e-05
## TSMySQL                       6.041618e-05
## labelled                      6.039574e-05
## GGUM                          6.039435e-05
## RRTCS                         6.037501e-05
## OSTSC                         6.036453e-05
## pmc                           6.035898e-05
## Imap                          6.035785e-05
## SIS                           6.035640e-05
## standardize                   6.034462e-05
## AWR.Kinesis                   6.033033e-05
## cp4p                          6.031461e-05
## aws.cloudtrail                6.031163e-05
## hyperSMURF                    6.030663e-05
## LDheatmap                     6.030148e-05
## phylolm                       6.029670e-05
## ROptSpace                     6.029645e-05
## pxweb                         6.029403e-05
## scidb                         6.029318e-05
## XR                            6.028087e-05
## ergm.ego                      6.026260e-05
## mvPot                         6.025737e-05
## AdaptGauss                    6.025502e-05
## bigReg                        6.024123e-05
## perm                          6.023774e-05
## sfc                           6.023719e-05
## otinference                   6.021571e-05
## polySegratioMM                6.021317e-05
## FunctionalNetworks            6.019244e-05
## rphylotastic                  6.018666e-05
## DeducerText                   6.018611e-05
## synRNASeqNet                  6.018437e-05
## spacodiR                      6.017642e-05
## MenuCollection                6.017022e-05
## geoknife                      6.014396e-05
## xaringan                      6.014363e-05
## BOG                           6.013749e-05
## ontologySimilarity            6.013457e-05
## BSGS                          6.013452e-05
## relimp                        6.012649e-05
## gamlss.cens                   6.010792e-05
## gbts                          6.010531e-05
## sglg                          6.010263e-05
## qqplotr                       6.009993e-05
## genotypeR                     6.009808e-05
## ore                           6.009790e-05
## BayesCR                       6.009573e-05
## paramGUI                      6.008902e-05
## fscaret                       6.008773e-05
## ROI.plugin.scs                6.008610e-05
## rfisheries                    6.008484e-05
## ccaPP                         6.007359e-05
## maxstat                       6.006188e-05
## segmented                     6.004708e-05
## logiBin                       6.002935e-05
## gyriq                         6.002670e-05
## sophisthse                    6.002422e-05
## swamp                         6.002028e-05
## fpp2                          6.001823e-05
## MultiMeta                     6.001278e-05
## ACEt                          6.001243e-05
## nodiv                         6.000873e-05
## ggfittext                     5.998995e-05
## imputeMulti                   5.998575e-05
## fCertificates                 5.998140e-05
## easySdcTable                  5.997299e-05
## RcmdrPlugin.EcoVirtual        5.997004e-05
## RcmdrPlugin.SLC               5.997004e-05
## RcmdrPlugin.steepness         5.997004e-05
## ggThemeAssist                 5.996696e-05
## GNE                           5.996098e-05
## lawn                          5.993990e-05
## pch                           5.991534e-05
## mixedMem                      5.988883e-05
## odpc                          5.986446e-05
## RadOnc                        5.986327e-05
## AdjBQR                        5.985062e-05
## Metatron                      5.982816e-05
## DatabionicSwarm               5.982516e-05
## ddst                          5.981682e-05
## esaddle                       5.980644e-05
## DDRTree                       5.980359e-05
## protolite                     5.978892e-05
## mvnormtest                    5.976862e-05
## Ecdat                         5.976311e-05
## rsnps                         5.976047e-05
## PredictABEL                   5.975729e-05
## tmle                          5.975428e-05
## UBL                           5.975066e-05
## modeest                       5.974202e-05
## EEM                           5.973377e-05
## algstat                       5.971781e-05
## gofastr                       5.971225e-05
## weightTAPSPACK                5.970310e-05
## GGMselect                     5.968496e-05
## blob                          5.967926e-05
## config                        5.967677e-05
## reGenotyper                   5.967521e-05
## BNSP                          5.967260e-05
## gazepath                      5.965275e-05
## rodham                        5.961890e-05
## basad                         5.961526e-05
## SubpathwayLNCE                5.960060e-05
## secret                        5.959395e-05
## RcppNumerical                 5.955951e-05
## MixedDataImpute               5.954947e-05
## TreeSearch                    5.953737e-05
## adabag                        5.951659e-05
## kantorovich                   5.950986e-05
## JOUSBoost                     5.949575e-05
## wtss                          5.948546e-05
## CMatching                     5.948362e-05
## cbar                          5.947799e-05
## aws.lambda                    5.947248e-05
## DVHmetrics                    5.943730e-05
## rptR                          5.943637e-05
## BoSSA                         5.943524e-05
## parmigene                     5.943352e-05
## iC10                          5.940121e-05
## variables                     5.939898e-05
## SimComp                       5.939212e-05
## Biolinv                       5.938714e-05
## RenextGUI                     5.938470e-05
## ppls                          5.937141e-05
## rccmisc                       5.936095e-05
## introgress                    5.934673e-05
## VCA                           5.934655e-05
## DatABEL                       5.933579e-05
## rem                           5.930656e-05
## concaveman                    5.929332e-05
## RCMIP5                        5.928084e-05
## metaheur                      5.927673e-05
## emojifont                     5.927247e-05
## confidence                    5.926792e-05
## Bioi                          5.926760e-05
## feedeR                        5.926488e-05
## bioimagetools                 5.925373e-05
## pbdRPC                        5.925348e-05
## repmis                        5.925012e-05
## bigQueryR                     5.924635e-05
## BayesFM                       5.924071e-05
## expss                         5.921707e-05
## cobalt                        5.921439e-05
## tolerance                     5.920653e-05
## aplpack                       5.920398e-05
## cubfits                       5.919768e-05
## qtlhot                        5.919557e-05
## ergm.count                    5.918878e-05
## meteoForecast                 5.918778e-05
## metaMA                        5.918072e-05
## RBMRB                         5.918049e-05
## cherry                        5.917858e-05
## aws.iam                       5.916267e-05
## aws.sns                       5.916267e-05
## aws.sqs                       5.916267e-05
## tcgsaseq                      5.915708e-05
## ARTool                        5.915135e-05
## GORCure                       5.912886e-05
## ICGOR                         5.912886e-05
## assertr                       5.912788e-05
## TSS.RESTREND                  5.907701e-05
## RcmdrPlugin.TeachingDemos     5.907179e-05
## spThin                        5.906914e-05
## dparser                       5.906581e-05
## effectR                       5.906458e-05
## sparseLTSEigen                5.904276e-05
## mizer                         5.904002e-05
## texPreview                    5.901913e-05
## phybreak                      5.901737e-05
## diveRsity                     5.901728e-05
## mapsapi                       5.899961e-05
## medfate                       5.899794e-05
## lcmm                          5.898392e-05
## Tlasso                        5.897948e-05
## rinat                         5.897409e-05
## eDMA                          5.896648e-05
## cointReg                      5.896147e-05
## multiPIM                      5.895583e-05
## discretization                5.894135e-05
## homals                        5.893870e-05
## RSauceLabs                    5.892734e-05
## ndjson                        5.892669e-05
## Watersheds                    5.891757e-05
## utilsIPEA                     5.891303e-05
## AdvBinomApps                  5.891003e-05
## ncar                          5.889044e-05
## soilphysics                   5.888568e-05
## MissingDataGUI                5.888323e-05
## bcp                           5.887634e-05
## famSKATRC                     5.887445e-05
## googleComputeEngineR          5.886243e-05
## rngtools                      5.883992e-05
## rsunlight                     5.880837e-05
## nlstools                      5.879784e-05
## AdequacyModel                 5.878995e-05
## DoE.MIParray                  5.876369e-05
## equateIRT                     5.876046e-05
## StVAR                         5.873250e-05
## PedCNV                        5.872847e-05
## resemble                      5.872053e-05
## aster                         5.869317e-05
## expandFunctions               5.868773e-05
## GOGANPA                       5.868564e-05
## TexExamRandomizer             5.867800e-05
## Rsymphony                     5.867229e-05
## yesno                         5.866741e-05
## orsk                          5.865610e-05
## virtualspecies                5.865326e-05
## StAMPP                        5.865089e-05
## whoami                        5.864929e-05
## meme                          5.864920e-05
## TLMoments                     5.864175e-05
## TrackReconstruction           5.862753e-05
## ProNet                        5.861057e-05
## rDEA                          5.860475e-05
## EditImputeCont                5.859873e-05
## adjustedcranlogs              5.859123e-05
## SDLfilter                     5.858387e-05
## waffle                        5.858176e-05
## hBayesDM                      5.857713e-05
## nmfem                         5.857552e-05
## sns                           5.856689e-05
## nearfar                       5.855713e-05
## seqMeta                       5.855710e-05
## qrencoder                     5.855336e-05
## striprtf                      5.854685e-05
## rnaturalearth                 5.853806e-05
## RcmdrPlugin.coin              5.852074e-05
## KSgeneral                     5.851566e-05
## EnviroPRA                     5.851551e-05
## zebu                          5.849732e-05
## dataPreparation               5.846472e-05
## nneo                          5.846160e-05
## icd                           5.845396e-05
## SHELF                         5.844808e-05
## MCDA                          5.844376e-05
## RCPmod                        5.843815e-05
## imagine                       5.843672e-05
## dblr                          5.843480e-05
## TileManager                   5.842515e-05
## NNLM                          5.841725e-05
## TSPred                        5.841533e-05
## permGPU                       5.840823e-05
## evmix                         5.840054e-05
## apaTables                     5.837032e-05
## CommT                         5.836400e-05
## aCRM                          5.835070e-05
## rKIN                          5.835016e-05
## RcmdrPlugin.ROC               5.834589e-05
## qut                           5.834290e-05
## gmDatabase                    5.833251e-05
## fitteR                        5.833098e-05
## oasis                         5.832008e-05
## lemon                         5.830753e-05
## BSGW                          5.827499e-05
## HDInterval                    5.825688e-05
## Rcplex                        5.824219e-05
## ouch                          5.824207e-05
## ccdrAlgorithm                 5.823034e-05
## ibeemd                        5.821168e-05
## reprex                        5.821074e-05
## ecosim                        5.819046e-05
## liteq                         5.818718e-05
## cmaesr                        5.817854e-05
## MRMR                          5.817093e-05
## nucim                         5.816633e-05
## rmonad                        5.816342e-05
## tfdatasets                    5.813637e-05
## ScottKnottESD                 5.812514e-05
## s4vd                          5.812450e-05
## frailtyHL                     5.812245e-05
## RApiSerialize                 5.812062e-05
## decomposedPSF                 5.811955e-05
## mQTL                          5.811867e-05
## rtable                        5.811556e-05
## decido                        5.811213e-05
## recexcavAAR                   5.811213e-05
## miCoPTCM                      5.811126e-05
## aptg                          5.810247e-05
## spectrolab                    5.809954e-05
## tbl2xts                       5.808021e-05
## analogsea                     5.807698e-05
## fasterize                     5.807100e-05
## biogeo                        5.806358e-05
## genderizeR                    5.805998e-05
## metScanR                      5.805829e-05
## RNHANES                       5.804988e-05
## ShortRead                     5.804778e-05
## SOIL                          5.803659e-05
## waterData                     5.801803e-05
## R2BayesX                      5.801673e-05
## starma                        5.801414e-05
## sizeMat                       5.801326e-05
## phyloTop                      5.801041e-05
## clime                         5.799688e-05
## antitrust                     5.799669e-05
## ROI.plugin.glpk               5.797699e-05
## RcmdrPlugin.PcaRobust         5.797607e-05
## mvLSW                         5.793893e-05
## granovaGG                     5.793643e-05
## patPRO                        5.793643e-05
## seleniumPipes                 5.791685e-05
## CorrectOverloadedPeaks        5.791188e-05
## distrTEst                     5.790035e-05
## flexCWM                       5.788225e-05
## MonoPhy                       5.787165e-05
## FamEvent                      5.787058e-05
## BHMSMAfMRI                    5.785010e-05
## SpatialBall                   5.784731e-05
## phytotools                    5.784264e-05
## extremevalues                 5.784015e-05
## tm.plugin.lexisnexis          5.783965e-05
## GCalignR                      5.782078e-05
## mexhaz                        5.781359e-05
## kmlShape                      5.781107e-05
## corpus                        5.778638e-05
## scorecard                     5.778146e-05
## fractalrock                   5.777344e-05
## msgtools                      5.776801e-05
## BBRecapture                   5.776758e-05
## UpSetR                        5.774344e-05
## bnspatial                     5.772173e-05
## PairViz                       5.772015e-05
## mpbart                        5.771503e-05
## satellite                     5.771192e-05
## slackr                        5.770889e-05
## timeSeq                       5.770200e-05
## hmmm                          5.768884e-05
## ssmn                          5.768849e-05
## PhViD                         5.768621e-05
## referenceIntervals            5.767731e-05
## RAHRS                         5.764630e-05
## tab                           5.762642e-05
## dpmr                          5.760560e-05
## pool                          5.760406e-05
## SetMethods                    5.760397e-05
## clere                         5.759102e-05
## cudaBayesreg                  5.758766e-05
## DiffCorr                      5.758278e-05
## logspline                     5.756720e-05
## nhlscrapr                     5.756538e-05
## mmcm                          5.755789e-05
## submax                        5.755789e-05
## tsbridge                      5.755789e-05
## doMPI                         5.754737e-05
## MST                           5.754541e-05
## lambda.tools                  5.754536e-05
## ngspatial                     5.754045e-05
## tagcloud                      5.753810e-05
## oro.pet                       5.753264e-05
## iki.dataclim                  5.751843e-05
## PoisNor                       5.749207e-05
## BaySIC                        5.748655e-05
## darksky                       5.748588e-05
## multiwayvcov                  5.748413e-05
## rqPen                         5.747105e-05
## sunburstR                     5.746525e-05
## BAYESDEF                      5.745249e-05
## Smisc                         5.744813e-05
## taRifx                        5.743760e-05
## denstrip                      5.742965e-05
## BioMark                       5.741126e-05
## translateR                    5.740983e-05
## lava.tobit                    5.740443e-05
## doRedis                       5.739728e-05
## originr                       5.739145e-05
## FlowScreen                    5.738551e-05
## futile.options                5.737704e-05
## GPrank                        5.737273e-05
## ForeCA                        5.736803e-05
## vscc                          5.735550e-05
## tabplot                       5.734686e-05
## zonator                       5.733927e-05
## parallelDist                  5.733398e-05
## roll                          5.733398e-05
## SpatPCA                       5.733398e-05
## mi                            5.728338e-05
## HistogramTools                5.727660e-05
## W2CWM2C                       5.726408e-05
## grove                         5.724717e-05
## liftr                         5.722073e-05
## psda                          5.721857e-05
## agRee                         5.720689e-05
## locpol                        5.720120e-05
## dae                           5.718214e-05
## gaston                        5.717465e-05
## covTestR                      5.716736e-05
## MultiBD                       5.714783e-05
## bayess                        5.714599e-05
## jackstraw                     5.713910e-05
## pafdR                         5.712067e-05
## PoisBinNonNor                 5.711997e-05
## geecure                       5.710807e-05
## hive                          5.710108e-05
## NHEMOtree                     5.708946e-05
## LCAextend                     5.707737e-05
## rslp                          5.707671e-05
## geoGAM                        5.707059e-05
## happybiRthday                 5.706940e-05
## micromap                      5.703962e-05
## geesmv                        5.703094e-05
## fExpressCertificates          5.701771e-05
## BayesMed                      5.699354e-05
## ggloop                        5.698808e-05
## cruts                         5.698558e-05
## SpaDES                        5.698406e-05
## mscstexta4r                   5.697878e-05
## orgR                          5.696708e-05
## tailDepFun                    5.696364e-05
## Dominance                     5.695847e-05
## basictabler                   5.695827e-05
## minPtest                      5.695250e-05
## CGPfunctions                  5.694037e-05
## PsumtSim                      5.691969e-05
## InvariantCausalPrediction     5.691122e-05
## nivm                          5.690256e-05
## powdist                       5.690015e-05
## pheno                         5.687149e-05
## DescribeDisplay               5.687025e-05
## cancensus                     5.686883e-05
## RndTexExams                   5.686850e-05
## RobPer                        5.686541e-05
## ipw                           5.685432e-05
## d3Tree                        5.682860e-05
## geeM                          5.682468e-05
## qGaussian                     5.681424e-05
## fastR                         5.681384e-05
## DiscreteWeibull               5.680009e-05
## AdaptFitOS                    5.679901e-05
## SpatioTemporal                5.679713e-05
## canprot                       5.678873e-05
## rbcb                          5.678757e-05
## queuecomputer                 5.678355e-05
## GUILDS                        5.676791e-05
## projections                   5.675488e-05
## cranlogs                      5.675020e-05
## AssocTests                    5.674619e-05
## oec                           5.673969e-05
## stranger                      5.670957e-05
## ROC632                        5.670803e-05
## billboarder                   5.670530e-05
## rdryad                        5.670286e-05
## xtractomatic                  5.669320e-05
## JuliaCall                     5.669005e-05
## PoisNonNor                    5.667647e-05
## GSED                          5.666396e-05
## COUNT                         5.666196e-05
## AF                            5.665823e-05
## Dpit                          5.665749e-05
## mcprofile                     5.665575e-05
## normalr                       5.664205e-05
## ciuupi                        5.663221e-05
## generalCorr                   5.663081e-05
## fakemake                      5.662303e-05
## RSIP                          5.661280e-05
## copulaedas                    5.661251e-05
## calibrator                    5.659517e-05
## MInt                          5.659166e-05
## reinsureR                     5.658997e-05
## SODC                          5.658618e-05
## CEoptim                       5.657683e-05
## ompr.roi                      5.657539e-05
## NominalLogisticBiplot         5.657378e-05
## PSM                           5.657028e-05
## loopr                         5.656414e-05
## RpeakChrom                    5.655949e-05
## hydroGOF                      5.655932e-05
## RxCEcolInf                    5.655895e-05
## microdemic                    5.655449e-05
## fracprolif                    5.654200e-05
## feather                       5.653817e-05
## itsadug                       5.653505e-05
## ParetoPosStable               5.651055e-05
## DBKGrad                       5.650768e-05
## h2o                           5.650423e-05
## sim1000G                      5.650233e-05
## outreg                        5.647348e-05
## redlistr                      5.644962e-05
## quickmapr                     5.643793e-05
## AdaptFit                      5.643636e-05
## bgmm                          5.641670e-05
## rdpla                         5.641334e-05
## OrdinalLogisticBiplot         5.640212e-05
## pid                           5.639324e-05
## asciiSetupReader              5.636047e-05
## JointAI                       5.634703e-05
## distrTeach                    5.634395e-05
## MARX                          5.634242e-05
## HDPenReg                      5.633533e-05
## ftDK                          5.633426e-05
## readit                        5.631694e-05
## fmlogcondens                  5.631671e-05
## WACS                          5.630018e-05
## rtimes                        5.629968e-05
## rbhl                          5.628599e-05
## nimble                        5.628510e-05
## NbClust                       5.627189e-05
## DEploid                       5.627121e-05
## mgpd                          5.625723e-05
## worrms                        5.624857e-05
## IROmiss                       5.624744e-05
## xray                          5.624507e-05
## rscorecard                    5.623077e-05
## landsat                       5.623033e-05
## metafuse                      5.622733e-05
## flood                         5.622631e-05
## pbdSLAP                       5.621777e-05
## dief                          5.621338e-05
## gpmap                         5.620907e-05
## tree.bins                     5.620874e-05
## eefAnalytics                  5.620667e-05
## prodest                       5.620172e-05
## RcmdrPlugin.mosaic            5.619806e-05
## pubmed.mineR                  5.619071e-05
## TraMineRextras                5.618940e-05
## brazilmaps                    5.618299e-05
## perturbR                      5.617406e-05
## hyper.fit                     5.616954e-05
## DPBBM                         5.616031e-05
## GDELTtools                    5.614165e-05
## ArchaeoChron                  5.613644e-05
## docxtools                     5.612570e-05
## topologyGSA                   5.610198e-05
## multitaper                    5.608899e-05
## srvyr                         5.608727e-05
## nls.multstart                 5.608726e-05
## ISOweek                       5.608431e-05
## RcppClassic                   5.608346e-05
## RcppClassicExamples           5.608346e-05
## sand                          5.607714e-05
## grImport                      5.605261e-05
## TCGA2STAT                     5.605261e-05
## designmatch                   5.604233e-05
## crs                           5.604198e-05
## CsChange                      5.603170e-05
## gsg                           5.598543e-05
## Matrix.utils                  5.597772e-05
## simLife                       5.596910e-05
## depthTools                    5.595002e-05
## glmvsd                        5.594829e-05
## LeLogicielR                   5.593125e-05
## TRSbook                       5.593125e-05
## bpcp                          5.593091e-05
## PResiduals                    5.592021e-05
## partools                      5.590203e-05
## glmm                          5.589375e-05
## nlnet                         5.587758e-05
## MultivariateRandomForest      5.586930e-05
## RcmdrPlugin.HH                5.586842e-05
## visualFields                  5.586713e-05
## tensorA                       5.586482e-05
## twilio                        5.585607e-05
## Qtools                        5.585516e-05
## uskewFactors                  5.585248e-05
## ICSOutlier                    5.583703e-05
## livechatR                     5.583515e-05
## Bios2cor                      5.583303e-05
## cleangeo                      5.582826e-05
## jqr                           5.582118e-05
## mobsim                        5.581688e-05
## R2OpenBUGS                    5.579431e-05
## dataonderivatives             5.579345e-05
## PoisBinOrd                    5.576963e-05
## mlegp                         5.573390e-05
## tseriesChaos                  5.571688e-05
## tweedie                       5.570283e-05
## tauturri                      5.570194e-05
## incR                          5.569615e-05
## SvyNom                        5.569469e-05
## surveydata                    5.568505e-05
## GPFDA                         5.568343e-05
## fakeR                         5.566456e-05
## CARrampsOcl                   5.565737e-05
## estatapi                      5.564642e-05
## OutlierDM                     5.564479e-05
## MAclinical                    5.563695e-05
## geex                          5.563154e-05
## mdhglm                        5.562944e-05
## uniah                         5.562834e-05
## rbgm                          5.561493e-05
## QuACN                         5.560799e-05
## sskm                          5.560028e-05
## AntAngioCOOL                  5.559644e-05
## nyctaxi                       5.559226e-05
## astrochron                    5.559188e-05
## denseFLMM                     5.558915e-05
## robfilter                     5.556657e-05
## control                       5.555605e-05
## FlexGAM                       5.554676e-05
## natserv                       5.554227e-05
## DNAtools                      5.554121e-05
## smbinning                     5.552518e-05
## NCmisc                        5.551405e-05
## imaginator                    5.550963e-05
## Bclim                         5.550873e-05
## NPC                           5.550666e-05
## lmenssp                       5.550290e-05
## tidytree                      5.549767e-05
## R2admb                        5.549737e-05
## stratbr                       5.548943e-05
## pipefittr                     5.548874e-05
## compute.es                    5.547873e-05
## glmulti                       5.547812e-05
## fAsianOptions                 5.547118e-05
## edarf                         5.546008e-05
## abcdeFBA                      5.545306e-05
## smcure                        5.544391e-05
## surface                       5.543674e-05
## samplesize4surveys            5.543489e-05
## Canopy                        5.542980e-05
## rrlda                         5.542374e-05
## RegularizedSCA                5.541699e-05
## BoolNet                       5.541062e-05
## CRTgeeDR                      5.540248e-05
## feature                       5.538950e-05
## measuRing                     5.538883e-05
## micEconAids                   5.538295e-05
## mritc                         5.537732e-05
## SPADAR                        5.537455e-05
## optpart                       5.537362e-05
## Rtextrankr                    5.536511e-05
## diffdepprop                   5.536356e-05
## mleur                         5.534910e-05
## randomLCA                     5.534868e-05
## cvAUC                         5.534250e-05
## ade4TkGUI                     5.531843e-05
## BiSEp                         5.530921e-05
## selfea                        5.530528e-05
## exifr                         5.530262e-05
## Corbi                         5.529943e-05
## MapGAM                        5.529931e-05
## datastepr                     5.529329e-05
## MsdeParEst                    5.528308e-05
## apa                           5.524836e-05
## sgeostat                      5.523833e-05
## bcv                           5.523803e-05
## SiZer                         5.523030e-05
## nesRdata                      5.522615e-05
## productivity                  5.519538e-05
## PKI                           5.519341e-05
## SNPtools                      5.518707e-05
## dhglm                         5.518594e-05
## pencopula                     5.517599e-05
## KRMM                          5.516914e-05
## DESnowball                    5.513334e-05
## simglm                        5.512362e-05
## CAM                           5.512253e-05
## IRATER                        5.512174e-05
## tidyimpute                    5.510629e-05
## BAMMtools                     5.509342e-05
## RapidPolygonLookup            5.508568e-05
## EpiBayes                      5.506880e-05
## ptw                           5.505881e-05
## qrjoint                       5.505542e-05
## DataLoader                    5.504684e-05
## distrRmetrics                 5.503077e-05
## ncdf4.helpers                 5.502056e-05
## wbsts                         5.499815e-05
## protiq                        5.499287e-05
## MSIseq                        5.497527e-05
## rneos                         5.497263e-05
## aurelius                      5.496127e-05
## cosinor2                      5.494817e-05
## coprimary                     5.489397e-05
## spray                         5.489366e-05
## localgauss                    5.489175e-05
## c3net                         5.488829e-05
## ChemometricsWithR             5.488752e-05
## mmand                         5.486929e-05
## actogrammr                    5.484781e-05
## AnDE                          5.484482e-05
## PSIMEX                        5.483648e-05
## AtelieR                       5.482964e-05
## testforDEP                    5.482499e-05
## ssmrob                        5.481664e-05
## acss                          5.481044e-05
## tgram                         5.481044e-05
## complexplus                   5.480043e-05
## Radviz                        5.479982e-05
## cepR                          5.479675e-05
## nonlinearICP                  5.477841e-05
## beadarray                     5.477686e-05
## qmap                          5.477116e-05
## rapidraker                    5.476546e-05
## games                         5.472955e-05
## WhatIf                        5.471028e-05
## adehabitat                    5.470960e-05
## som.nn                        5.468825e-05
## dataview                      5.468698e-05
## spotifyr                      5.468573e-05
## BinNor                        5.467404e-05
## PhaseType                     5.465520e-05
## phia                          5.465218e-05
## robets                        5.464608e-05
## simsalapar                    5.464194e-05
## estimability                  5.463796e-05
## obliqueRF                     5.461276e-05
## ggseas                        5.459622e-05
## attempt                       5.457119e-05
## CoImp                         5.456245e-05
## braidReports                  5.456204e-05
## meteogRam                     5.456204e-05
## plotMElm                      5.456204e-05
## BNPMediation                  5.456023e-05
## ggalluvial                    5.455972e-05
## polyCub                       5.455463e-05
## augSIMEX                      5.453419e-05
## dendroextras                  5.453041e-05
## GameTheoryAllocation          5.449075e-05
## couchDB                       5.447581e-05
## apTreeshape                   5.446944e-05
## NAM                           5.446686e-05
## Rknots                        5.445721e-05
## carpenter                     5.445330e-05
## norm                          5.443567e-05
## ARCensReg                     5.443368e-05
## kdensity                      5.443252e-05
## EnvCpt                        5.442898e-05
## aspace                        5.441897e-05
## collUtils                     5.440078e-05
## beam                          5.440043e-05
## RProtoBuf                     5.440006e-05
## BigTSP                        5.439763e-05
## rockchalk                     5.437998e-05
## permDep                       5.435608e-05
## casebase                      5.435529e-05
## REREFACT                      5.435355e-05
## moonBook                      5.433307e-05
## abctools                      5.433247e-05
## cdata                         5.432696e-05
## CommEcol                      5.431023e-05
## AmyloGram                     5.429824e-05
## rr                            5.429552e-05
## BayesTwin                     5.428896e-05
## merDeriv                      5.427286e-05
## PDN                           5.426009e-05
## bmp                           5.424139e-05
## hitandrun                     5.423322e-05
## iNextPD                       5.423174e-05
## RWBP                          5.421514e-05
## quantoptr                     5.421139e-05
## CRPClustering                 5.420598e-05
## logging                       5.420194e-05
## DTRlearn                      5.419888e-05
## pCalibrate                    5.418951e-05
## dils                          5.417216e-05
## rcv                           5.416667e-05
## lfda                          5.415887e-05
## EMMAgeo                       5.414765e-05
## upwaver                       5.414111e-05
## cpt                           5.414048e-05
## rcreds                        5.411046e-05
## conformalClassification       5.410192e-05
## io                            5.409448e-05
## RLogicalOps                   5.409448e-05
## SuperGauss                    5.409363e-05
## rnn                           5.409340e-05
## muhaz                         5.407944e-05
## MDplot                        5.406891e-05
## FDGcopulas                    5.406040e-05
## openNLPdata                   5.405218e-05
## rorutadis                     5.404532e-05
## estprod                       5.404449e-05
## gasfluxes                     5.403674e-05
## epistasis                     5.401326e-05
## lctools                       5.400955e-05
## tableHTML                     5.399710e-05
## mixedsde                      5.398884e-05
## fitur                         5.398091e-05
## desctable                     5.397727e-05
## spcosa                        5.397450e-05
## photobiologyWavebands         5.397375e-05
## svDialogstcltk                5.395199e-05
## svGUI                         5.395199e-05
## rdflib                        5.393717e-05
## GiNA                          5.393414e-05
## automultinomial               5.391723e-05
## ECOSolveR                     5.391162e-05
## HDoutliers                    5.389861e-05
## NADA                          5.388062e-05
## jocre                         5.386679e-05
## REPPlab                       5.386558e-05
## iBST                          5.386428e-05
## lllcrc                        5.385845e-05
## diffusionMap                  5.383975e-05
## jagsUI                        5.382630e-05
## CIAAWconsensus                5.382483e-05
## AWR                           5.380883e-05
## rbenchmark                    5.380748e-05
## rwc                           5.380104e-05
## mosaicCalc                    5.380054e-05
## SpATS                         5.379831e-05
## RSentiment                    5.378840e-05
## convexjlr                     5.376623e-05
## AR                            5.375908e-05
## echogram                      5.375706e-05
## rerf                          5.374924e-05
## evclust                       5.374573e-05
## sptm                          5.373888e-05
## forega                        5.373858e-05
## BIS                           5.373387e-05
## DataEntry                     5.373198e-05
## mateable                      5.372607e-05
## TippingPoint                  5.372571e-05
## EFS                           5.372494e-05
## ProgGUIinR                    5.372481e-05
## graphscan                     5.371914e-05
## phenmod                       5.369993e-05
## rrBLUP                        5.369544e-05
## adeba                         5.368505e-05
## SSDforR                       5.366632e-05
## rfml                          5.365333e-05
## sommer                        5.363386e-05
## ECoL                          5.362507e-05
## betapart                      5.362447e-05
## spselect                      5.360768e-05
## nbc4va                        5.360275e-05
## gsrsb                         5.357254e-05
## flowr                         5.357127e-05
## SCRT                          5.356970e-05
## piecewiseSEM                  5.356344e-05
## BANOVA                        5.355966e-05
## rtip                          5.355605e-05
## DESeq                         5.355461e-05
## languagelayeR                 5.355123e-05
## InterfaceqPCR                 5.354669e-05
## grpss                         5.353594e-05
## base64                        5.353430e-05
## MExPosition                   5.353210e-05
## fbati                         5.352472e-05
## listviewer                    5.352462e-05
## QCAtools                      5.351871e-05
## BinaryEPPM                    5.350463e-05
## oXim                          5.349579e-05
## bioset                        5.349414e-05
## bnnSurvival                   5.349179e-05
## Rsampletrees                  5.349001e-05
## GeoMongo                      5.348813e-05
## coreCT                        5.348545e-05
## rhmmer                        5.348346e-05
## HIBPwned                      5.348253e-05
## multgee                       5.346969e-05
## OptimalDesign                 5.345142e-05
## ELT                           5.344654e-05
## RKEA                          5.344090e-05
## Lmoments                      5.343355e-05
## qrng                          5.339753e-05
## abd                           5.337535e-05
## lolR                          5.336081e-05
## ensembleMOS                   5.334606e-05
## predictionInterval            5.334157e-05
## replicationInterval           5.334157e-05
## LGRF                          5.334124e-05
## MTS                           5.331590e-05
## assertive.code                5.331421e-05
## SID                           5.330555e-05
## subspace                      5.329405e-05
## siRSM                         5.326544e-05
## NEArender                     5.325977e-05
## xVA                           5.325674e-05
## Trading                       5.325674e-05
## VBLPCM                        5.325187e-05
## cgam                          5.325152e-05
## staTools                      5.324036e-05
## Mobilize                      5.323868e-05
## Maeswrap                      5.321984e-05
## VSE                           5.321804e-05
## radmixture                    5.320921e-05
## opusminer                     5.319703e-05
## pmatch                        5.319478e-05
## P2C2M                         5.318967e-05
## HelpersMG                     5.318939e-05
## combiter                      5.318440e-05
## rpf                           5.315575e-05
## spatialprobit                 5.314492e-05
## mcemGLM                       5.313944e-05
## popsom                        5.312820e-05
## fishmove                      5.311256e-05
## hetGP                         5.311044e-05
## aphid                         5.309278e-05
## phylogram                     5.309278e-05
## MAc                           5.308169e-05
## cccd                          5.307058e-05
## idar                          5.306782e-05
## walrus                        5.306651e-05
## delt                          5.306302e-05
## intccr                        5.305557e-05
## DivE                          5.304457e-05
## untb                          5.303600e-05
## GEEaSPU                       5.303034e-05
## papayar                       5.302867e-05
## IMTest                        5.301936e-05
## esc                           5.301217e-05
## difconet                      5.300953e-05
## DCluster                      5.300776e-05
## lintools                      5.300488e-05
## tidypredict                   5.299291e-05
## sbart                         5.295296e-05
## GeDS                          5.294241e-05
## ShinyImage                    5.293074e-05
## latticeDensity                5.292144e-05
## seismicRoll                   5.291950e-05
## ivregEX                       5.291641e-05
## tidyboot                      5.290411e-05
## CADFtest                      5.289744e-05
## HUM                           5.286437e-05
## AppliedPredictiveModeling     5.285017e-05
## SiMRiv                        5.284855e-05
## edpclient                     5.284478e-05
## broman                        5.284430e-05
## RFinfer                       5.283794e-05
## scmamp                        5.282999e-05
## homomorpheR                   5.282615e-05
## Phase123                      5.282241e-05
## survAccuracyMeasures          5.282241e-05
## DataCombine                   5.282215e-05
## cifti                         5.281939e-05
## R.huge                        5.281720e-05
## blmeco                        5.281718e-05
## fUnitRoots                    5.277951e-05
## pbatR                         5.276920e-05
## mcGlobaloptim                 5.276647e-05
## medmod                        5.275987e-05
## onewaytests                   5.275982e-05
## xcms                          5.274633e-05
## leafletR                      5.274106e-05
## rkafka                        5.272570e-05
## rkafkajars                    5.272570e-05
## TBFmultinomial                5.272182e-05
## RcmdrPlugin.MA                5.270937e-05
## validateRS                    5.268633e-05
## miniCRAN                      5.267786e-05
## PARSE                         5.266491e-05
## snowboot                      5.266466e-05
## plac                          5.266308e-05
## diagonals                     5.265409e-05
## etasFLP                       5.264265e-05
## BayesBinMix                   5.263304e-05
## wellknown                     5.263076e-05
## CopulaREMADA                  5.262520e-05
## awsjavasdk                    5.259493e-05
## relSim                        5.258305e-05
## asremlPlus                    5.256717e-05
## LightningR                    5.254817e-05
## ViSiElse                      5.254605e-05
## CompareCausalNetworks         5.254418e-05
## CVR                           5.253627e-05
## pca3d                         5.253482e-05
## TwoRegression                 5.252925e-05
## ordinalForest                 5.251886e-05
## easyVerification              5.251670e-05
## BNSL                          5.250958e-05
## mailR                         5.250659e-05
## frequencyConnectedness        5.249229e-05
## spdynmod                      5.249192e-05
## wmwpow                        5.248375e-05
## zyp                           5.248058e-05
## hsphase                       5.247031e-05
## gems                          5.246859e-05
## plumbr                        5.245670e-05
## smam                          5.245577e-05
## conf.design                   5.244620e-05
## KernSmoothIRT                 5.243682e-05
## DiceView                      5.243219e-05
## treebase                      5.243157e-05
## scrapeR                       5.232092e-05
## clustRcompaR                  5.230518e-05
## spTDyn                        5.230495e-05
## spTimer                       5.230495e-05
## funtimes                      5.230121e-05
## ndl                           5.229108e-05
## facilitation                  5.227075e-05
## divest                        5.226324e-05
## OmicKriging                   5.225742e-05
## ivmodel                       5.225350e-05
## Rbitcoin                      5.224864e-05
## archiDART                     5.224564e-05
## templates                     5.224415e-05
## cclust                        5.224210e-05
## truncSP                       5.224125e-05
## taxlist                       5.223021e-05
## ssfa                          5.222764e-05
## corkscrew                     5.222006e-05
## hit                           5.221774e-05
## PanelCount                    5.221131e-05
## spacyr                        5.221001e-05
## fxregime                      5.219999e-05
## rrcov3way                     5.219446e-05
## SEMID                         5.218964e-05
## splitstackshape               5.218396e-05
## oddsratio                     5.216475e-05
## bvarsv                        5.213934e-05
## replyr                        5.213509e-05
## RCriteo                       5.213388e-05
## RForcecom                     5.213388e-05
## emdist                        5.213350e-05
## streamR                       5.212540e-05
## spelling                      5.211399e-05
## soilprofile                   5.211361e-05
## GEOquery                      5.210873e-05
## distrom                       5.210275e-05
## gamlr                         5.210275e-05
## geosapi                       5.209826e-05
## BAMBI                         5.208083e-05
## ISOcodes                      5.207590e-05
## spex                          5.207036e-05
## DDHFm                         5.206109e-05
## tumblR                        5.206062e-05
## ROI.plugin.deoptim            5.205879e-05
## powerlmm                      5.205646e-05
## sicegar                       5.204519e-05
## WikipediR                     5.204239e-05
## rcss                          5.203622e-05
## rflann                        5.203622e-05
## DODR                          5.202677e-05
## TPD                           5.202139e-05
## rYoutheria                    5.200919e-05
## ChannelAttribution            5.199693e-05
## ClassComparison               5.197718e-05
## WikidataR                     5.196732e-05
## dfphase1                      5.194230e-05
## ldat                          5.194081e-05
## lvec                          5.194081e-05
## Funclustering                 5.191873e-05
## anMC                          5.191153e-05
## mixpack                       5.191153e-05
## BWStest                       5.190561e-05
## RcppDE                        5.190383e-05
## adehabitatHS                  5.189692e-05
## VARtests                      5.189563e-05
## lcopula                       5.189455e-05
## knitcitations                 5.187087e-05
## PBImisc                       5.185639e-05
## ChannelAttributionApp         5.185133e-05
## datafsm                       5.185086e-05
## PAWL                          5.183391e-05
## RobustCalibration             5.183391e-05
## RobustGaSP                    5.183391e-05
## stressr                       5.183062e-05
## dichromat                     5.182381e-05
## pGMGM                         5.180267e-05
## PDQutils                      5.178615e-05
## MonetDBLite                   5.178221e-05
## REBayes                       5.178192e-05
## audio                         5.176410e-05
## Ryacas                        5.173157e-05
## RNOmni                        5.172583e-05
## yarrr                         5.172004e-05
## mfGARCH                       5.171017e-05
## AdhereR                       5.169888e-05
## OIdata                        5.169783e-05
## BioPET                        5.169451e-05
## csampling                     5.168367e-05
## marg                          5.168367e-05
## NlinTS                        5.166989e-05
## bife                          5.166803e-05
## fdaMixed                      5.166803e-05
## gee4                          5.166803e-05
## jmcm                          5.166803e-05
## TripleR                       5.165633e-05
## addhazard                     5.165609e-05
## DNMF                          5.165558e-05
## sphet                         5.165054e-05
## gWidgets2tcltk                5.163280e-05
## mbclusterwise                 5.160603e-05
## CINOEDV                       5.160492e-05
## memgene                       5.160277e-05
## BarcodingR                    5.160171e-05
## cOde                          5.159154e-05
## edeR                          5.159118e-05
## RGoogleFit                    5.158870e-05
## activity                      5.158730e-05
## plusser                       5.157819e-05
## MAVE                          5.157584e-05
## bairt                         5.157573e-05
## KernelKnn                     5.156408e-05
## cqrReg                        5.155379e-05
## esreg                         5.155379e-05
## WaveletArima                  5.155256e-05
## MatchItSE                     5.154229e-05
## rspa                          5.154185e-05
## simstudy                      5.153685e-05
## pacman                        5.153648e-05
## mapmisc                       5.153161e-05
## paleoTS                       5.151938e-05
## ruv                           5.151670e-05
## CARBayesdata                  5.150664e-05
## rite                          5.150146e-05
## iECAT                         5.149047e-05
## MetaSKAT                      5.149047e-05
## wavelets                      5.148254e-05
## profileR                      5.147991e-05
## glamlasso                     5.147326e-05
## coda.base                     5.146804e-05
## hogsvdR                       5.146804e-05
## secure                        5.146804e-05
## vwr                           5.146767e-05
## Robocoap                      5.145900e-05
## MergeGUI                      5.144844e-05
## rsem                          5.144770e-05
## CCA                           5.144380e-05
## mvna                          5.143869e-05
## adaptiveGPCA                  5.143239e-05
## MRwarping                     5.142919e-05
## Rlabkey                       5.142828e-05
## graphql                       5.141748e-05
## regsem                        5.141034e-05
## x13binary                     5.140336e-05
## textreg                       5.139800e-05
## npsm                          5.139663e-05
## Rborist                       5.139130e-05
## antiword                      5.139116e-05
## rosqp                         5.137996e-05
## FastSF                        5.134522e-05
## recmap                        5.134146e-05
## FastHCS                       5.133411e-05
## RGENERATE                     5.132844e-05
## synthACS                      5.132788e-05
## SDMPlay                       5.132332e-05
## lulcc                         5.131593e-05
## vdg                           5.131454e-05
## JumpTest                      5.130871e-05
## pointRes                      5.129886e-05
## rmda                          5.128882e-05
## labeling                      5.128450e-05
## udpipe                        5.127088e-05
## growthrate                    5.125242e-05
## burnr                         5.124483e-05
## kernelboot                    5.124343e-05
## DecorateR                     5.122844e-05
## RWekajars                     5.122844e-05
## calibrar                      5.122523e-05
## vennplot                      5.121921e-05
## madrat                        5.121176e-05
## rarhsmm                       5.120410e-05
## regnet                        5.120410e-05
## radiomics                     5.120188e-05
## lexRankr                      5.118648e-05
## solaR                         5.118422e-05
## RcextTools                    5.117423e-05
## ibdreg                        5.115280e-05
## Rvmmin                        5.114459e-05
## PersomicsArray                5.112216e-05
## plotROC                       5.112059e-05
## BEST                          5.111762e-05
## hsdar                         5.111648e-05
## inegiR                        5.111449e-05
## CodeDepends                   5.110997e-05
## pompom                        5.110196e-05
## simFrame                      5.109577e-05
## EMAtools                      5.109158e-05
## bfa                           5.107062e-05
## zic                           5.107062e-05
## Rfacebook                     5.106118e-05
## complmrob                     5.106041e-05
## GenAlgo                       5.105676e-05
## smoothSurv                    5.105285e-05
## ahp                           5.105010e-05
## CovSel                        5.104687e-05
## grImport2                     5.104022e-05
## EIAdata                       5.103774e-05
## musica                        5.101674e-05
## VSURF                         5.100323e-05
## emIRT                         5.098333e-05
## aws.ses                       5.098234e-05
## incidence                     5.098117e-05
## gsw                           5.097777e-05
## MRS                           5.096571e-05
## netrankr                      5.096571e-05
## gamlss.demo                   5.093688e-05
## psbcGroup                     5.093583e-05
## ether                         5.093376e-05
## EnsCat                        5.092968e-05
## treeClust                     5.091081e-05
## clustEff                      5.090515e-05
## spatstat.local                5.090321e-05
## inca                          5.090220e-05
## netcoh                        5.090220e-05
## repolr                        5.090220e-05
## robustreg                     5.090220e-05
## synlik                        5.090220e-05
## mar1s                         5.089691e-05
## MixRF                         5.089460e-05
## bioplots                      5.089051e-05
## osmar                         5.088856e-05
## vegclust                      5.088736e-05
## HIMA                          5.088383e-05
## PogromcyDanych                5.088062e-05
## castor                        5.087306e-05
## helsinki                      5.087062e-05
## CRF                           5.086900e-05
## dfmeta                        5.086068e-05
## pMineR                        5.085530e-05
## rgdax                         5.084686e-05
## FastPCS                       5.083628e-05
## philentropy                   5.082533e-05
## diffusr                       5.080638e-05
## graphkernels                  5.080638e-05
## imguR                         5.079799e-05
## cranlike                      5.079438e-05
## AIG                           5.079195e-05
## gifti                         5.078897e-05
## iBATCGH                       5.078011e-05
## portfolio                     5.077686e-05
## HMMEsolver                    5.077440e-05
## KRIG                          5.077440e-05
## mclustcomp                    5.077440e-05
## DetMCD                        5.077191e-05
## cladoRcpp                     5.076684e-05
## fts                           5.075941e-05
## pxR                           5.074915e-05
## metacart                      5.074522e-05
## AWR.KMS                       5.074371e-05
## qgam                          5.074363e-05
## ADMMnet                       5.074287e-05
## APML0                         5.074287e-05
## grf                           5.074287e-05
## sparseHessianFD               5.074287e-05
## soilcarbon                    5.072480e-05
## RVideoPoker                   5.072024e-05
## RcppBlaze                     5.071605e-05
## weatherr                      5.070660e-05
## PortfolioAnalytics            5.070111e-05
## fmbasics                      5.069591e-05
## ADPclust                      5.069093e-05
## VDAP                          5.068550e-05
## cdlTools                      5.065761e-05
## reshapeGUI                    5.065139e-05
## RcmdrPlugin.survival          5.064994e-05
## idbr                          5.064423e-05
## ANLP                          5.064002e-05
## ecb                           5.063260e-05
## MazamaWebUtils                5.060509e-05
## tigerhitteR                   5.060352e-05
## KEGGREST                      5.059712e-05
## cooptrees                     5.058684e-05
## collapsibleTree               5.057486e-05
## BoolFilter                    5.056150e-05
## FisHiCal                      5.055389e-05
## MRH                           5.055133e-05
## NestedCategBayesImpute        5.054989e-05
## rapport                       5.054856e-05
## strat                         5.053210e-05
## sigmaNet                      5.052506e-05
## bucky                         5.052103e-05
## ANN2                          5.051467e-05
## compendiumdb                  5.049632e-05
## NetworkRiskMeasures           5.049492e-05
## ramcmc                        5.048358e-05
## gtrendsR                      5.047686e-05
## esaBcv                        5.046148e-05
## meshsimp                      5.045796e-05
## ASPBay                        5.044979e-05
## mcPAFit                       5.044117e-05
## FinancialInstrument           5.043853e-05
## lcyanalysis                   5.043853e-05
## odfWeave                      5.043004e-05
## eva                           5.041006e-05
## ISOpureR                      5.040582e-05
## wgaim                         5.039768e-05
## tufte                         5.038585e-05
## RH2                           5.037030e-05
## SDDE                          5.035809e-05
## lgtdl                         5.035746e-05
## tpr                           5.035746e-05
## cbsodataR                     5.035355e-05
## gSEM                          5.034835e-05
## facebook.S4                   5.034730e-05
## rRAP                          5.034454e-05
## mada                          5.033947e-05
## scrubr                        5.029667e-05
## RcppFaddeeva                  5.029328e-05
## gamlss.tr                     5.027606e-05
## toOrdinal                     5.027236e-05
## acrt                          5.026705e-05
## frontiles                     5.026253e-05
## chunked                       5.026173e-05
## readability                   5.026031e-05
## sendmailR                     5.024318e-05
## colorpatch                    5.023430e-05
## lplyr                         5.022037e-05
## wakefield                     5.019759e-05
## PCADSC                        5.018123e-05
## rnpn                          5.016742e-05
## httptest                      5.015659e-05
## sqliter                       5.013527e-05
## n1qn1                         5.012838e-05
## tutorial                      5.012157e-05
## GLDreg                        5.011201e-05
## sperich                       5.010792e-05
## blkergm                       5.010213e-05
## ergm.graphlets                5.010213e-05
## ergm.rank                     5.010213e-05
## ergm.userterms                5.010213e-05
## ngstk                         5.009837e-05
## RMixpanel                     5.009404e-05
## bibtex                        5.008643e-05
## fingerprint                   5.008511e-05
## rollply                       5.008373e-05
## hesim                         5.007774e-05
## interplot                     5.006332e-05
## ltbayes                       5.004786e-05
## smnet                         5.003474e-05
## rjsonapi                      5.003115e-05
## asus                          5.001775e-05
## geigen                        5.001089e-05
## multiApply                    5.000222e-05
## freqdom.fda                   5.000035e-05
## nprobust                      4.999793e-05
## dcmodify                      4.999697e-05
## bvpSolve                      4.998827e-05
## rwunderground                 4.998424e-05
## RSocrata                      4.997953e-05
## faraway                       4.997888e-05
## QRegVCM                       4.997255e-05
## RcmdrPlugin.sos               4.996175e-05
## onlinePCA                     4.994554e-05
## kofdata                       4.994117e-05
## tstools                       4.993709e-05
## icr                           4.992503e-05
## rIsing                        4.991841e-05
## dawai                         4.991495e-05
## shelltrace                    4.990829e-05
## M3                            4.990603e-05
## RcppGreedySetCover            4.989159e-05
## blockmodels                   4.989138e-05
## IAPWS95                       4.988462e-05
## hypoparsr                     4.988231e-05
## covatest                      4.987132e-05
## RcppXts                       4.986775e-05
## SnakeCharmR                   4.985537e-05
## HSAR                          4.985178e-05
## trajectories                  4.984694e-05
## logmult                       4.983176e-05
## TDD                           4.983046e-05
## liftLRD                       4.982884e-05
## yakmoR                        4.982380e-05
## algorithmia                   4.981405e-05
## HTSCluster                    4.980357e-05
## simSummary                    4.979487e-05
## vagalumeR                     4.978896e-05
## ECFsup                        4.978825e-05
## zCompositions                 4.978275e-05
## popkin                        4.977612e-05
## projmanr                      4.977340e-05
## BayesGESM                     4.977201e-05
## MicSim                        4.976025e-05
## wosr                          4.975979e-05
## cmsaf                         4.975725e-05
## ICBayes                       4.974466e-05
## superdiag                     4.974415e-05
## condusco                      4.973320e-05
## stmCorrViz                    4.972509e-05
## catlearn                      4.972334e-05
## SeqKat                        4.972334e-05
## Evomorph                      4.972189e-05
## EQL                           4.971712e-05
## MVB                           4.970906e-05
## fastnet                       4.969050e-05
## UScensus2010                  4.966903e-05
## bigalgebra                    4.966349e-05
## textcat                       4.965868e-05
## BioCircos                     4.965287e-05
## aoos                          4.962768e-05
## DCchoice                      4.961041e-05
## sybilcycleFreeFlux            4.960918e-05
## qCBA                          4.960874e-05
## GeneCycle                     4.960706e-05
## reliaR                        4.960387e-05
## RSeed                         4.960205e-05
## rlas                          4.959696e-05
## GAMens                        4.959642e-05
## CVThresh                      4.957637e-05
## treethresh                    4.957637e-05
## ForImp                        4.957202e-05
## proteomics                    4.956505e-05
## TSMining                      4.956505e-05
## meta4diag                     4.955377e-05
## perccal                       4.954974e-05
## ridigbio                      4.954466e-05
## ROI.plugin.symphony           4.953718e-05
## safer                         4.953665e-05
## BoltzMM                       4.952291e-05
## GiRaF                         4.952291e-05
## RcppMLPACK                    4.952291e-05
## NormalLaplace                 4.951835e-05
## ttutils                       4.951324e-05
## BatchMap                      4.951321e-05
## ordinalClust                  4.950968e-05
## rje                           4.950899e-05
## nasadata                      4.949839e-05
## ncmeta                        4.949821e-05
## sbtools                       4.948523e-05
## spongecake                    4.947802e-05
## datarobot                     4.947023e-05
## gamboostLSS                   4.946344e-05
## scaRabee                      4.945674e-05
## gender                        4.944278e-05
## DIFboost                      4.942226e-05
## beyondWhittle                 4.942154e-05
## benchr                        4.941964e-05
## GCPM                          4.941964e-05
## data360r                      4.941803e-05
## pqantimalarials               4.941290e-05
## SimplicialCubature            4.940977e-05
## superpc                       4.940128e-05
## IUPS                          4.940095e-05
## permutations                  4.939428e-05
## sylly                         4.939112e-05
## Rclusterpp                    4.939041e-05
## apex                          4.938945e-05
## ukds                          4.937872e-05
## rootWishart                   4.936359e-05
## tranSurv                      4.935845e-05
## alterryx                      4.935621e-05
## mkde                          4.934046e-05
## KappaV                        4.933985e-05
## haarfisz                      4.933958e-05
## seawaveQ                      4.929998e-05
## ggsn                          4.929756e-05
## SDraw                         4.929654e-05
## RGA                           4.929484e-05
## ctmle                         4.929196e-05
## RepeatedHighDim               4.928406e-05
## dslice                        4.928361e-05
## IncDTW                        4.928361e-05
## LendingClub                   4.927801e-05
## Rgnuplot                      4.927014e-05
## qualV                         4.926889e-05
## sofa                          4.926614e-05
## platetools                    4.926441e-05
## reinforcelearn                4.925573e-05
## sharx                         4.924819e-05
## tm.plugin.factiva             4.924540e-05
## sparsebn                      4.924520e-05
## soiltexture                   4.923394e-05
## MLEcens                       4.920521e-05
## rintrojs                      4.920324e-05
## tsgui                         4.919425e-05
## cdom                          4.918220e-05
## scagnostics                   4.917030e-05
## MixedPoisson                  4.916351e-05
## googlePolylines               4.915082e-05
## gvcR                          4.914921e-05
## qualityTools                  4.912981e-05
## vein                          4.911654e-05
## summariser                    4.910990e-05
## flora                         4.910220e-05
## oaColors                      4.908844e-05
## metabolomics                  4.908842e-05
## MARSS                         4.907485e-05
## solvebio                      4.907434e-05
## lmQCM                         4.906862e-05
## kmc                           4.906674e-05
## pulver                        4.905980e-05
## iWISA                         4.905701e-05
## multichull                    4.901353e-05
## ruler                         4.900199e-05
## LumReader                     4.898400e-05
## MODISSnow                     4.897884e-05
## siland                        4.897001e-05
## dfcomb                        4.896639e-05
## dfmta                         4.896639e-05
## toolmaRk                      4.896512e-05
## fitbitScraper                 4.894430e-05
## zoocat                        4.893019e-05
## bayeslongitudinal             4.892835e-05
## SympluR                       4.890167e-05
## CopulaDTA                     4.890105e-05
## GENEAread                     4.888437e-05
## TestingSimilarity             4.886286e-05
## BTYD                          4.885888e-05
## modest                        4.884330e-05
## accrual                       4.884232e-05
## gridGraphviz                  4.883947e-05
## gtop                          4.883939e-05
## opencage                      4.883613e-05
## netmeta                       4.882565e-05
## ISM                           4.882420e-05
## rprime                        4.882021e-05
## AcousticNDLCodeR              4.881809e-05
## ArfimaMLM                     4.881069e-05
## sorvi                         4.880705e-05
## storr                         4.880420e-05
## rscopus                       4.880086e-05
## AIM                           4.878177e-05
## cond                          4.877434e-05
## BALCONY                       4.877097e-05
## GOplot                        4.875885e-05
## LinkedMatrix                  4.873004e-05
## ggcorrplot                    4.872348e-05
## BivarP                        4.871661e-05
## IDPSurvival                   4.871034e-05
## monkeylearn                   4.871021e-05
## smovie                        4.869328e-05
## SocialNetworks                4.869228e-05
## RcmdrPlugin.GWRM              4.865596e-05
## PVAClone                      4.865079e-05
## beepr                         4.865072e-05
## neurohcp                      4.864991e-05
## rebird                        4.863946e-05
## peperr                        4.863701e-05
## addreg                        4.863202e-05
## geotoolsR                     4.861541e-05
## geotopbricks                  4.860413e-05
## FLSSS                         4.860345e-05
## StMoSim                       4.860345e-05
## rdatacite                     4.859789e-05
## CausalFX                      4.859752e-05
## MLCIRTwithin                  4.859732e-05
## inum                          4.859373e-05
## qusage                        4.858380e-05
## IATscores                     4.858128e-05
## mixexp                        4.856911e-05
## Mcomp                         4.856270e-05
## EDMeasure                     4.854460e-05
## DeducerExtras                 4.852577e-05
## expp                          4.849263e-05
## GOstats                       4.848069e-05
## ggfan                         4.847002e-05
## Deriv                         4.846592e-05
## binsmooth                     4.845381e-05
## pheno2geno                    4.844315e-05
## RImageJROI                    4.842189e-05
## crplyr                        4.841963e-05
## MIICD                         4.841599e-05
## mwa                           4.839591e-05
## datastructures                4.837987e-05
## wordcloud2                    4.836351e-05
## spgwr                         4.836002e-05
## alphaOutlier                  4.835158e-05
## wunderscraper                 4.834692e-05
## RnavGraph                     4.834673e-05
## eixport                       4.833904e-05
## mtsdi                         4.832927e-05
## pathmox                       4.831357e-05
## turner                        4.831357e-05
## gridDebug                     4.830537e-05
## HadoopStreaming               4.827840e-05
## expsmooth                     4.826971e-05
## fma                           4.826971e-05
## coreSim                       4.823904e-05
## ALSM                          4.823108e-05
## sublime                       4.822971e-05
## samplingEstimates             4.822377e-05
## roots                         4.821607e-05
## spectral                      4.821169e-05
## rChoiceDialogs                4.821155e-05
## fractional                    4.820459e-05
## shadow                        4.819916e-05
## statebins                     4.818002e-05
## VARsignR                      4.816171e-05
## ChoR                          4.815209e-05
## Rcgmin                        4.814963e-05
## rabi                          4.814102e-05
## ROI.plugin.quadprog           4.809655e-05
## voteogram                     4.809534e-05
## candisc                       4.809358e-05
## rif                           4.808988e-05
## itunesr                       4.806814e-05
## G1DBN                         4.805580e-05
## GeneClusterNet                4.805580e-05
## colorednoise                  4.804528e-05
## riem                          4.802399e-05
## CPE                           4.802190e-05
## softclassval                  4.801499e-05
## RSurveillance                 4.801256e-05
## ToolsForCoDa                  4.799865e-05
## NCSampling                    4.799844e-05
## geoaxe                        4.798104e-05
## tuber                         4.797887e-05
## ptinpoly                      4.797850e-05
## colorplaner                   4.797246e-05
## dataCompareR                  4.796278e-05
## IM                            4.794697e-05
## findviews                     4.794317e-05
## aemo                          4.794311e-05
## udunits2                      4.790870e-05
## electionsBR                   4.790624e-05
## gld                           4.787487e-05
## inlabru                       4.786249e-05
## spatialClust                  4.786064e-05
## regRSM                        4.785918e-05
## sos                           4.785339e-05
## crrp                          4.783834e-05
## x12                           4.783688e-05
## vembedr                       4.783528e-05
## Nippon                        4.783443e-05
## AMOEBA                        4.782696e-05
## DIFlasso                      4.782518e-05
## CVST                          4.781879e-05
## qiitr                         4.781158e-05
## TreatmentSelection            4.781150e-05
## robustDA                      4.779377e-05
## DEoptimR                      4.778557e-05
## Cite                          4.777543e-05
## GANPAdata                     4.774605e-05
## censys                        4.773926e-05
## LPM                           4.773400e-05
## elhmc                         4.773221e-05
## spareserver                   4.771848e-05
## MCMCvis                       4.771438e-05
## RcmdrPlugin.EBM               4.770783e-05
## robis                         4.770008e-05
## svcm                          4.768969e-05
## hglm.data                     4.765527e-05
## comtradr                      4.762944e-05
## scatterpie                    4.762626e-05
## EMD                           4.760708e-05
## pollstR                       4.760147e-05
## mht                           4.759889e-05
## MMS                           4.759889e-05
## packagetrackr                 4.759507e-05
## performanceEstimation         4.759340e-05
## GGEBiplotGUI                  4.758707e-05
## HomoPolymer                   4.758476e-05
## farff                         4.757111e-05
## ROI.plugin.ipop               4.757041e-05
## FAwR                          4.756919e-05
## RobustAFT                     4.756210e-05
## multimode                     4.754708e-05
## crochet                       4.751862e-05
## rld                           4.751093e-05
## timelineS                     4.750786e-05
## IMP                           4.750779e-05
## timeROC                       4.750571e-05
## MoTBFs                        4.748418e-05
## hht                           4.746728e-05
## ROCS                          4.746186e-05
## totalcensus                   4.745948e-05
## coxinterval                   4.745537e-05
## pass                          4.744252e-05
## Grid2Polygons                 4.744209e-05
## Metrics                       4.744097e-05
## OrdFacReg                     4.742538e-05
## MetaAnalyser                  4.742474e-05
## randstr                       4.741819e-05
## cwm                           4.739940e-05
## RIA                           4.738804e-05
## presens                       4.738531e-05
## rtypeform                     4.738485e-05
## waver                         4.734830e-05
## SpatialPosition               4.733463e-05
## itcSegment                    4.733279e-05
## deGradInfer                   4.732571e-05
## slickR                        4.732401e-05
## osd                           4.732254e-05
## IndependenceTests             4.731316e-05
## tsqn                          4.730881e-05
## interfr                       4.728338e-05
## polypoly                      4.727743e-05
## asymmetry                     4.727694e-05
## SemiMarkov                    4.727415e-05
## fishMod                       4.727243e-05
## CollapseLevels                4.726026e-05
## Dowd                          4.722687e-05
## ecipex                        4.720964e-05
## RandomFieldsUtils             4.720794e-05
## RNRCS                         4.720352e-05
## MatchingFrontier              4.719999e-05
## ROI.models.miplib             4.719678e-05
## IQCC                          4.718004e-05
## KraljicMatrix                 4.712537e-05
## desire                        4.712077e-05
## gsEasy                        4.710203e-05
## fetchR                        4.709556e-05
## sclero                        4.709408e-05
## SEL                           4.709038e-05
## BACprior                      4.708168e-05
## qVarSel                       4.707245e-05
## OutlierDC                     4.707194e-05
## learningCurve                 4.706724e-05
## enviPat                       4.706497e-05
## BayesSpec                     4.706202e-05
## rPraat                        4.706144e-05
## mvst                          4.705973e-05
## kcirt                         4.705359e-05
## ionicons                      4.704857e-05
## RcmdrPlugin.RiskDemo          4.702949e-05
## Holidays                      4.702666e-05
## snakecase                     4.701923e-05
## tsxtreme                      4.701110e-05
## risksetROC                    4.699692e-05
## colorSpec                     4.698836e-05
## SemiCompRisks                 4.698619e-05
## geneSLOPE                     4.698059e-05
## diffusion                     4.697496e-05
## flexsurvcure                  4.696524e-05
## AMR                           4.696281e-05
## shiny.semantic                4.696111e-05
## meetupapi                     4.695261e-05
## GsymPoint                     4.694308e-05
## gcerisk                       4.693408e-05
## intReg                        4.693115e-05
## metricsgraphics               4.692202e-05
## KEGGgraph                     4.692064e-05
## zenplots                      4.691973e-05
## forestmodel                   4.688850e-05
## kaps                          4.688366e-05
## episheet                      4.687645e-05
## spatialTailDep                4.687600e-05
## covLCA                        4.685482e-05
## chopsticks                    4.685286e-05
## fftw                          4.685093e-05
## rfishbase                     4.685064e-05
## excerptr                      4.684987e-05
## SLICER                        4.684691e-05
## trend                         4.684321e-05
## qpgraph                       4.683658e-05
## simputation                   4.682820e-05
## braQCA                        4.682221e-05
## sgt                           4.676531e-05
## RJSDMX                        4.675026e-05
## fanovaGraph                   4.674905e-05
## stopwords                     4.673402e-05
## bgeva                         4.673226e-05
## EDISON                        4.672930e-05
## smcfcs                        4.672618e-05
## ForecastCombinations          4.671597e-05
## rwalkr                        4.671575e-05
## iNOTE                         4.671502e-05
## JointModel                    4.670374e-05
## pewdata                       4.669457e-05
## DoubleCone                    4.668193e-05
## approximator                  4.667971e-05
## RFgroove                      4.667215e-05
## NIPTeR                        4.666244e-05
## depmixS4                      4.665997e-05
## DMRMark                       4.665906e-05
## msme                          4.665164e-05
## spAddins                      4.663113e-05
## plmm                          4.662881e-05
## rpsftm                        4.662327e-05
## frair                         4.662093e-05
## greyzoneSurv                  4.659480e-05
## BMS                           4.659131e-05
## JointRegBC                    4.658609e-05
## MDMR                          4.658435e-05
## growthrates                   4.657341e-05
## CommonJavaJars                4.657181e-05
## rwt                           4.655485e-05
## ESEA                          4.655161e-05
## multinomRob                   4.654203e-05
## surv2sampleComp               4.653768e-05
## highmean                      4.653428e-05
## cosso                         4.652996e-05
## nparcomp                      4.652424e-05
## anoint                        4.652226e-05
## sitar                         4.651270e-05
## psychotree                    4.651046e-05
## MuViCP                        4.650535e-05
## ngramrr                       4.649407e-05
## Grace                         4.649348e-05
## funFEM                        4.649088e-05
## meboot                        4.649033e-05
## DySeq                         4.648645e-05
## WindCurves                    4.648641e-05
## ADDT                          4.648182e-05
## kernplus                      4.648158e-05
## mixsep                        4.647896e-05
## survivalROC                   4.647382e-05
## isocir                        4.647089e-05
## kequate                       4.647037e-05
## shinyTime                     4.645213e-05
## fcuk                          4.642284e-05
## km.ci                         4.641745e-05
## PAGWAS                        4.639829e-05
## SNscan                        4.639421e-05
## baseballDBR                   4.639391e-05
## DTR                           4.638869e-05
## autoSEM                       4.637944e-05
## barcode                       4.635569e-05
## equivalence                   4.635453e-05
## orloca.es                     4.634677e-05
## yearn                         4.634669e-05
## AcuityView                    4.634575e-05
## gamlssbssn                    4.633346e-05
## widgetframe                   4.632977e-05
## glmmML                        4.632110e-05
## convertr                      4.631950e-05
## SFtools                       4.630461e-05
## spikeslab                     4.630005e-05
## rnaseqWrapper                 4.628958e-05
## Myrrix                        4.628043e-05
## Rdrools                       4.628043e-05
## RMOA                          4.628043e-05
## Myrrixjars                    4.628043e-05
## Rdroolsjars                   4.628043e-05
## RMOAjars                      4.628043e-05
## XRJulia                       4.627664e-05
## Frames2                       4.627398e-05
## sdPrior                       4.624096e-05
## DAGGER                        4.622807e-05
## manet                         4.621690e-05
## streamMOA                     4.621238e-05
## scs                           4.621099e-05
## archetypes                    4.620275e-05
## hgam                          4.620090e-05
## mdsdt                         4.619351e-05
## expint                        4.617407e-05
## logcondiscr                   4.617377e-05
## SurvCorr                      4.617332e-05
## migui                         4.617181e-05
## discreteRV                    4.613649e-05
## ZIBseq                        4.613334e-05
## cdfquantreg                   4.613179e-05
## LinkageMapView                4.611872e-05
## NetPreProc                    4.611186e-05
## analogueExtra                 4.610444e-05
## BVS                           4.608373e-05
## PartCensReg                   4.607207e-05
## maptree                       4.606456e-05
## eesim                         4.606362e-05
## AEDForecasting                4.606225e-05
## GGMridge                      4.602691e-05
## BayesSingleSub                4.600337e-05
## bcgam                         4.600316e-05
## BSquare                       4.599528e-05
## permuco                       4.598906e-05
## plmDE                         4.597994e-05
## minerva                       4.596503e-05
## sortinghat                    4.596060e-05
## LifeHist                      4.594928e-05
## InformationValue              4.593935e-05
## fcd                           4.592984e-05
## cardidates                    4.592143e-05
## spatial.gev.bma               4.592122e-05
## SADISA                        4.592078e-05
## selectiveInference            4.591695e-05
## BEDASSLE                      4.590396e-05
## GROAN                         4.589885e-05
## phmm                          4.588902e-05
## IntegratedJM                  4.588793e-05
## rioja                         4.588685e-05
## VariableScreening             4.588337e-05
## EGRETci                       4.585225e-05
## EMMIXcskew                    4.585173e-05
## RiskPortfolios                4.584731e-05
## plink                         4.584376e-05
## distrr                        4.583607e-05
## wrangle                       4.583607e-05
## probout                       4.581751e-05
## enrichwith                    4.580955e-05
## OSMscale                      4.580284e-05
## docxtractr                    4.578505e-05
## r.jive                        4.577454e-05
## LeArEst                       4.577284e-05
## readOffice                    4.577161e-05
## SimpleTable                   4.576352e-05
## gurobi                        4.575758e-05
## insideRODE                    4.574792e-05
## nlmeODE                       4.574792e-05
## brainR                        4.574543e-05
## SASxport                      4.573766e-05
## TFisher                       4.573708e-05
## KenSyn                        4.573538e-05
## hett                          4.573402e-05
## logitnorm                     4.572942e-05
## simule                        4.572863e-05
## OjaNP                         4.572307e-05
## DWLasso                       4.571371e-05
## FRAPO                         4.571325e-05
## kst                           4.568405e-05
## geneSignatureFinder           4.567910e-05
## Lavash                        4.566786e-05
## funreg                        4.566548e-05
## glmmLasso                     4.565921e-05
## BcDiag                        4.565605e-05
## RGtk2Extras                   4.564615e-05
## RAMpath                       4.563241e-05
## ordPens                       4.562223e-05
## misreport                     4.560990e-05
## SweaveListingUtils            4.559904e-05
## MultiGHQuad                   4.559817e-05
## SmoothHazard                  4.559375e-05
## nanotime                      4.559310e-05
## narray                        4.559276e-05
## R4CouchDB                     4.558801e-05
## Select                        4.558647e-05
## semGOF                        4.558190e-05
## NormalGamma                   4.557588e-05
## RcmdrPlugin.Export            4.556971e-05
## Ohmage                        4.554979e-05
## phyclust                      4.554282e-05
## GPM                           4.553912e-05
## RVtests                       4.552835e-05
## OHPL                          4.552717e-05
## nls2                          4.552027e-05
## gamlss.mx                     4.551387e-05
## redland                       4.551233e-05
## DFIT                          4.550152e-05
## tracer                        4.549239e-05
## gset                          4.546484e-05
## popEpi                        4.545271e-05
## pglm                          4.545020e-05
## adhoc                         4.544251e-05
## EMMIXskew                     4.542201e-05
## tikzDevice                    4.541680e-05
## bayescount                    4.541393e-05
## ScreenClean                   4.540372e-05
## CatEncoders                   4.540358e-05
## mdsOpt                        4.540313e-05
## oii                           4.540235e-05
## sae                           4.539783e-05
## acid                          4.539752e-05
## UNCLES                        4.539227e-05
## polyapost                     4.539101e-05
## fcr                           4.538285e-05
## clinPK                        4.537615e-05
## fftwtools                     4.537321e-05
## BCE                           4.536856e-05
## dendrometeR                   4.536385e-05
## FacPad                        4.535134e-05
## NegBinBetaBinreg              4.534533e-05
## reglogit                      4.534533e-05
## dmt                           4.530949e-05
## ROI.models.globalOptTests     4.530569e-05
## gnFit                         4.530455e-05
## VecStatGraphs3D               4.528293e-05
## B2Z                           4.527251e-05
## mvQuad                        4.525741e-05
## discSurv                      4.525535e-05
## IndepTest                     4.525314e-05
## irtProb                       4.524680e-05
## corehunter                    4.523632e-05
## spNNGP                        4.523073e-05
## meifly                        4.522782e-05
## bnstruct                      4.522558e-05
## GWRM                          4.522450e-05
## mlogitBMA                     4.522237e-05
## GFGM.copula                   4.520377e-05
## GLDEX                         4.517791e-05
## rxSeq                         4.516640e-05
## RcppCCTZ                      4.516604e-05
## molaR                         4.516295e-05
## wavemulcor                    4.516290e-05
## micEconSNQP                   4.515885e-05
## stable                        4.515850e-05
## riv                           4.514179e-05
## titan                         4.513633e-05
## FreeSortR                     4.512196e-05
## kdetrees                      4.511738e-05
## rly                           4.511415e-05
## My.stepwise                   4.510692e-05
## Rclean                        4.510539e-05
## dsmodels                      4.508425e-05
## dcGOR                         4.507086e-05
## structree                     4.505622e-05
## sodavis                       4.505574e-05
## transport                     4.504383e-05
## gamlss.util                   4.502201e-05
## joint.Cox                     4.501878e-05
## HMDHFDplus                    4.500301e-05
## mosaicData                    4.500073e-05
## icensmis                      4.499720e-05
## piton                         4.499720e-05
## icRSF                         4.499720e-05
## tidyxl                        4.499720e-05
## lmvar                         4.499038e-05
## CALIBERrfimpute               4.499022e-05
## rSARP                         4.498467e-05
## quint                         4.498442e-05
## sesem                         4.496803e-05
## logcondens.mode               4.496283e-05
## chromoR                       4.495917e-05
## TempleMetrics                 4.495724e-05
## prabclus                      4.493912e-05
## rareGE                        4.493055e-05
## ppclust                       4.490776e-05
## NPCD                          4.490586e-05
## BayesSAE                      4.490306e-05
## addhaz                        4.490183e-05
## distory                       4.490118e-05
## TipDatingBeast                4.488950e-05
## SSRMST                        4.488205e-05
## survRM2                       4.488205e-05
## maxTPR                        4.487858e-05
## glmertree                     4.487579e-05
## gma                           4.485297e-05
## tnet                          4.485111e-05
## vesselr                       4.484302e-05
## BayesS5                       4.482734e-05
## ajv                           4.480557e-05
## nLTT                          4.480513e-05
## LPKsample                     4.480331e-05
## lassoscore                    4.479996e-05
## ThresholdROC                  4.479504e-05
## SCMA                          4.479344e-05
## semTools                      4.479086e-05
## UncertainInterval             4.478488e-05
## MultisiteMediation            4.478353e-05
## R2DT                          4.478224e-05
## irtreliability                4.476197e-05
## expoRkit                      4.474779e-05
## erp.easy                      4.474506e-05
## sensory                       4.474240e-05
## wskm                          4.473936e-05
## RHPCBenchmark                 4.473699e-05
## ARTIVA                        4.473325e-05
## ICGE                          4.471720e-05
## biwt                          4.471230e-05
## mbrglm                        4.470814e-05
## msmtools                      4.470797e-05
## phrasemachine                 4.467341e-05
## LW1949                        4.467083e-05
## IPMpack                       4.466588e-05
## ReinforcementLearning         4.466264e-05
## gvcm.cat                      4.465614e-05
## sphereplot                    4.465209e-05
## paleoMAS                      4.464942e-05
## HiTC                          4.464532e-05
## ArCo                          4.463789e-05
## glacierSMBM                   4.462990e-05
## inferference                  4.460068e-05
## Rlibeemd                      4.459839e-05
## mefa4                         4.459390e-05
## cba                           4.459024e-05
## sensR                         4.458974e-05
## bamboo                        4.458003e-05
## eiwild                        4.457948e-05
## hyper2                        4.456527e-05
## MEPDF                         4.455728e-05
## InformativeCensoring          4.454233e-05
## eRm                           4.453465e-05
## rCUR                          4.453465e-05
## MCL                           4.453435e-05
## HLSM                          4.453209e-05
## PPRL                          4.452443e-05
## opera                         4.452271e-05
## qtlc                          4.450749e-05
## plotMCMC                      4.450682e-05
## clipr                         4.449898e-05
## lymphclon                     4.449705e-05
## GWAF                          4.449452e-05
## devFunc                       4.448734e-05
## gower                         4.448113e-05
## optrdd                        4.446993e-05
## systemicrisk                  4.446723e-05
## MortalityLaws                 4.445764e-05
## GDAtools                      4.444129e-05
## miLineage                     4.443973e-05
## causaleffect                  4.443802e-05
## RISmed                        4.443617e-05
## trioGxE                       4.441046e-05
## picasso                       4.441002e-05
## Sofi                          4.439096e-05
## agop                          4.438413e-05
## hysteresis                    4.436516e-05
## optbdmaeAT                    4.436366e-05
## optrcdmaeAT                   4.436366e-05
## soptdmaeA                     4.436366e-05
## peptider                      4.436009e-05
## iRefR                         4.435653e-05
## StatRank                      4.435197e-05
## prettycode                    4.433985e-05
## DOBAD                         4.432924e-05
## AnthropMMD                    4.432265e-05
## medicalrisk                   4.431664e-05
## CountsEPPM                    4.431565e-05
## plotmo                        4.431221e-05
## stacomirtools                 4.430987e-05
## glogis                        4.430920e-05
## lazyWeave                     4.430850e-05
## MetStaT                       4.430670e-05
## anacor                        4.430537e-05
## RhpcBLASctl                   4.430193e-05
## rSymPy                        4.429577e-05
## Rbgs                          4.428833e-05
## labelVector                   4.428756e-05
## dirichletprocess              4.428163e-05
## msSurv                        4.427775e-05
## FGN                           4.425609e-05
## pedigreemm                    4.421197e-05
## FitARMA                       4.420878e-05
## detect                        4.420271e-05
## vfcp                          4.419790e-05
## svIDE                         4.418740e-05
## rcbsubset                     4.418099e-05
## learnstats                    4.417653e-05
## cgmanalysis                   4.415740e-05
## fragilityindex                4.415417e-05
## RMediation                    4.415269e-05
## runittotestthat               4.415080e-05
## PET                           4.414162e-05
## assertive.data                4.411253e-05
## assertive.data.uk             4.411253e-05
## assertive.data.us             4.411253e-05
## ConsRank                      4.411206e-05
## kzft                          4.410544e-05
## optim.functions               4.410170e-05
## dlsem                         4.410084e-05
## BART                          4.409187e-05
## geoelectrics                  4.409097e-05
## lagsarlmtree                  4.408527e-05
## ratelimitr                    4.407688e-05
## groupdata2                    4.407340e-05
## momr                          4.407113e-05
## rPowerSampleSize              4.406493e-05
## bigRR                         4.405389e-05
## stratification                4.404821e-05
## Data2LD                       4.404296e-05
## PATHChange                    4.403723e-05
## svTools                       4.403283e-05
## PROFANCY                      4.403231e-05
## mlma                          4.403110e-05
## Modalclust                    4.402927e-05
## sas7bdat                      4.402308e-05
## MarkowitzR                    4.401399e-05
## goeveg                        4.400045e-05
## texteffect                    4.399757e-05
## gmediation                    4.399729e-05
## sscor                         4.399136e-05
## TriadSim                      4.398886e-05
## popRange                      4.396175e-05
## RWebLogo                      4.396175e-05
## stagePop                      4.395044e-05
## EFAutilities                  4.393387e-05
## heatmap.plus                  4.388368e-05
## PBSddesolve                   4.388255e-05
## pcrcoal                       4.388092e-05
## PANICr                        4.388024e-05
## hzar                          4.388009e-05
## PASWR                         4.387905e-05
## BootValidation                4.387323e-05
## sharpeRratio                  4.386875e-05
## denoiseR                      4.385926e-05
## SoyNAM                        4.385891e-05
## RGF                           4.384857e-05
## switchr                       4.384063e-05
## errorlocate                   4.383924e-05
## validatetools                 4.383924e-05
## windex                        4.383765e-05
## PLmixed                       4.383485e-05
## simecol                       4.383262e-05
## dynOmics                      4.381865e-05
## cowbell                       4.381282e-05
## LPmerge                       4.380877e-05
## wfe                           4.379871e-05
## phenex                        4.379078e-05
## BSPADATA                      4.377436e-05
## scape                         4.376713e-05
## ltmle                         4.375225e-05
## seg                           4.375048e-05
## curvetest                     4.374704e-05
## future.batchtools             4.374133e-05
## fugeR                         4.373977e-05
## flsa                          4.373953e-05
## visreg                        4.373948e-05
## Rnets                         4.373711e-05
## bigsplines                    4.373208e-05
## roughrf                       4.372714e-05
## FastRWeb                      4.372402e-05
## ICC                           4.371552e-05
## assertive.datetimes           4.371027e-05
## influence.ME                  4.370891e-05
## prLogistic                    4.370600e-05
## correctedAUC                  4.369085e-05
## mmpf                          4.367450e-05
## SubLasso                      4.367069e-05
## audiolyzR                     4.366541e-05
## ppsbm                         4.361775e-05
## blockcluster                  4.361155e-05
## ggconf                        4.360919e-05
## DengueRT                      4.359652e-05
## TideCurves                    4.358811e-05
## kerasformula                  4.357658e-05
## DTComPair                     4.356687e-05
## robustX                       4.356573e-05
## artfima                       4.356176e-05
## GxM                           4.355843e-05
## colormap                      4.354749e-05
## fastcmh                       4.354440e-05
## DistatisR                     4.353910e-05
## econullnetr                   4.353428e-05
## Rmalschains                   4.353384e-05
## spd                           4.352689e-05
## tigreBrowserWriter            4.352684e-05
## gear                          4.352031e-05
## madness                       4.350263e-05
## pcIRT                         4.349945e-05
## CPMCGLM                       4.345988e-05
## RsimMosaic                    4.345978e-05
## Conigrave                     4.345570e-05
## shopifyr                      4.344487e-05
## assertive.reflection          4.344182e-05
## robreg3S                      4.344013e-05
## AMIAS                         4.343174e-05
## aods3                         4.343079e-05
## r2d2                          4.342126e-05
## gk                            4.342074e-05
## rdatamarket                   4.341464e-05
## gimme                         4.341210e-05
## surveyplanning                4.341206e-05
## pamctdp                       4.340755e-05
## CVD                           4.339878e-05
## Giza                          4.338810e-05
## RApiDatetime                  4.338458e-05
## cosinor                       4.337925e-05
## RcppTN                        4.337717e-05
## Stickbreaker                  4.337047e-05
## qha                           4.336076e-05
## MTurkRGUI                     4.335991e-05
## PBSmapping                    4.335646e-05
## bigml                         4.335156e-05
## CHAT                          4.334796e-05
## GD                            4.334768e-05
## LLM                           4.334573e-05
## quantregForest                4.333721e-05
## WaterML                       4.333059e-05
## MultiABEL                     4.331511e-05
## HBSTM                         4.330467e-05
## idmTPreg                      4.328252e-05
## PTE                           4.328252e-05
## sbrl                          4.327335e-05
## bmk                           4.324977e-05
## proftools                     4.324756e-05
## rvcheck                       4.324706e-05
## PRISMA                        4.319964e-05
## Scale                         4.319494e-05
## globalOptTests                4.318556e-05
## clusteval                     4.318100e-05
## iNEXT                         4.316457e-05
## geonames                      4.315492e-05
## PeerPerformance               4.314281e-05
## RDSTK                         4.313607e-05
## uptimeRobot                   4.313607e-05
## MultiVarSel                   4.313194e-05
## fArma                         4.313165e-05
## fBonds                        4.313165e-05
## fNonlinear                    4.313165e-05
## fTrading                      4.313165e-05
## hpoPlot                       4.311967e-05
## httpcode                      4.311593e-05
## IPMRF                         4.310026e-05
## thief                         4.309933e-05
## tm.plugin.europresse          4.308481e-05
## RGraphics                     4.308047e-05
## Rsomoclu                      4.307523e-05
## Przewodnik                    4.307211e-05
## aVirtualTwins                 4.306044e-05
## QPBoot                        4.304124e-05
## cooccur                       4.303430e-05
## ONETr                         4.303059e-05
## SetRank                       4.302120e-05
## hkex.api                      4.301889e-05
## csv                           4.301255e-05
## ShapeSelectForest             4.301076e-05
## RDocumentation                4.299931e-05
## assertive.sets                4.299911e-05
## badger                        4.299735e-05
## EpiDynamics                   4.297739e-05
## xSub                          4.297051e-05
## LncFinder                     4.296947e-05
## sodium                        4.296609e-05
## metacor                       4.295687e-05
## MCMC.OTU                      4.294611e-05
## MCMC.qpcr                     4.294611e-05
## reghelper                     4.293588e-05
## Rcsdp                         4.293551e-05
## velociraptr                   4.292856e-05
## pipe.design                   4.292771e-05
## iMediate                      4.292430e-05
## ivlewbel                      4.291407e-05
## rTableICC                     4.291031e-05
## PSAgraphics                   4.290544e-05
## xkcd                          4.289352e-05
## RPushbullet                   4.289060e-05
## Ruchardet                     4.287436e-05
## RXKCD                         4.287106e-05
## TSCS                          4.286801e-05
## DAAG                          4.285972e-05
## geoRglm                       4.285326e-05
## phonR                         4.284658e-05
## snpReady                      4.284464e-05
## telegram.bot                  4.283340e-05
## smoother                      4.283075e-05
## stppResid                     4.282367e-05
## YaleToolkit                   4.282241e-05
## jetset                        4.282077e-05
## phyext2                       4.281152e-05
## difR                          4.281011e-05
## GpGp                          4.280896e-05
## centiserve                    4.279045e-05
## collpcm                       4.278616e-05
## ctqr                          4.278319e-05
## ripa                          4.277657e-05
## globals                       4.277567e-05
## fpCompare                     4.276258e-05
## clampSeg                      4.275916e-05
## FDRSeg                        4.275916e-05
## linearQ                       4.275916e-05
## SMFI5                         4.275668e-05
## modules                       4.275372e-05
## cocor                         4.274286e-05
## mcga                          4.274054e-05
## ALKr                          4.273750e-05
## clusrank                      4.273750e-05
## flam                          4.273750e-05
## JMcmprsk                      4.273750e-05
## RGeode                        4.273750e-05
## wally                         4.272364e-05
## pvsR                          4.270802e-05
## BoomSpikeSlab                 4.270444e-05
## PropClust                     4.269876e-05
## cmvnorm                       4.269073e-05
## hwwntest                      4.268517e-05
## datapasta                     4.267567e-05
## STARTS                        4.267517e-05
## MBmca                         4.267040e-05
## james.analysis                4.266536e-05
## GHap                          4.265503e-05
## RepeatABEL                    4.265331e-05
## NetOrigin                     4.263583e-05
## SuperRanker                   4.262466e-05
## electoral                     4.261583e-05
## RI2by2                        4.261391e-05
## fontHind                      4.261264e-05
## fontMPlus                     4.261264e-05
## additiveDEA                   4.260706e-05
## kitagawa                      4.259246e-05
## scrm                          4.258946e-05
## simpleboot                    4.258895e-05
## wBoot                         4.258895e-05
## MLmetrics                     4.257412e-05
## CorporaCoCo                   4.257083e-05
## descr                         4.256822e-05
## dockerfiler                   4.256506e-05
## seplyr                        4.255620e-05
## ReorderCluster                4.254125e-05
## micromapST                    4.253892e-05
## SCEPtER                       4.252662e-05
## SCEPtERbinary                 4.252662e-05
## Rgb                           4.252009e-05
## sos4R                         4.251652e-05
## pmml                          4.251015e-05
## rAltmetric                    4.250462e-05
## ips                           4.247926e-05
## TVsMiss                       4.247356e-05
## swa                           4.246996e-05
## SNFtool                       4.246388e-05
## signalHsmm                    4.245349e-05
## CCMnet                        4.244814e-05
## MLInterfaces                  4.244748e-05
## aws                           4.243929e-05
## dCovTS                        4.243881e-05
## mvnmle                        4.242248e-05
## netCoin                       4.241935e-05
## commonmark                    4.241021e-05
## PASWR2                        4.240894e-05
## Emcdf                         4.240616e-05
## httpcache                     4.240281e-05
## fdadensity                    4.239278e-05
## RcppThread                    4.238138e-05
## rWishart                      4.235551e-05
## distillery                    4.235106e-05
## sure                          4.234772e-05
## rbacon                        4.234009e-05
## oaxaca                        4.232983e-05
## TOSTER                        4.232805e-05
## optimsimplex                  4.232169e-05
## histry                        4.231879e-05
## PSTR                          4.231863e-05
## elo                           4.230612e-05
## treemapify                    4.229598e-05
## RAC                           4.229363e-05
## RcmdrPlugin.depthTools        4.228957e-05
## FactoInvestigate              4.228761e-05
## bfp                           4.226378e-05
## NLPutils                      4.225968e-05
## traitr                        4.224890e-05
## lar                           4.224370e-05
## otrimle                       4.224237e-05
## mlapi                         4.223578e-05
## multinet                      4.223517e-05
## multinets                     4.223517e-05
## coga                          4.223314e-05
## ivpack                        4.222691e-05
## stosim                        4.221422e-05
## pipeR                         4.220678e-05
## outbreaker                    4.220588e-05
## StreamMetabolism              4.219653e-05
## BACCT                         4.219644e-05
## LS2W                          4.219507e-05
## gmeta                         4.219229e-05
## detzrcr                       4.219228e-05
## ecespa                        4.219053e-05
## selectspm                     4.219053e-05
## productplots                  4.218183e-05
## AhoCorasickTrie               4.217797e-05
## FSInteract                    4.217166e-05
## inarmix                       4.217166e-05
## LassoBacktracking             4.217166e-05
## PRIMME                        4.217166e-05
## Rdtq                          4.217166e-05
## sparsio                       4.217166e-05
## spatgraphs                    4.217166e-05
## perry                         4.217120e-05
## influenceR                    4.215687e-05
## colourlovers                  4.214511e-05
## tsiR                          4.214142e-05
## ALEPlot                       4.214122e-05
## GrpString                     4.213765e-05
## geoscale                      4.212129e-05
## docopt                        4.210754e-05
## OOBCurve                      4.210258e-05
## ICRanks                       4.210081e-05
## reconstructr                  4.209985e-05
## tdr                           4.209779e-05
## mlxR                          4.209656e-05
## BootWPTOS                     4.209570e-05
## afCEC                         4.208664e-05
## spiderbar                     4.207660e-05
## lsl                           4.207214e-05
## pscore                        4.207214e-05
## relaxnet                      4.206759e-05
## widenet                       4.206759e-05
## MIXFIM                        4.206144e-05
## vita                          4.204017e-05
## rexpokit                      4.203630e-05
## NNS                           4.203372e-05
## nlts                          4.202427e-05
## fastAdaboost                  4.202040e-05
## WEE                           4.201390e-05
## prc                           4.199605e-05
## photobiologyPlants            4.199398e-05
## WDI                           4.198335e-05
## blink                         4.198019e-05
## FAdist                        4.197553e-05
## textrank                      4.196254e-05
## lpbrim                        4.195888e-05
## Jdmbs                         4.195245e-05
## freesurfer                    4.194838e-05
## funData                       4.194066e-05
## DescriptiveStats.OBeu         4.193919e-05
## rechonest                     4.193401e-05
## ROpenWeatherMap               4.193401e-05
## RStripe                       4.193401e-05
## RYandexTranslate              4.193401e-05
## SocialMediaMineR              4.193401e-05
## sweidnumbr                    4.193364e-05
## GLIDE                         4.192815e-05
## randomGLM                     4.192815e-05
## vkR                           4.192473e-05
## hds                           4.190229e-05
## XBRL                          4.189403e-05
## diezeit                       4.189237e-05
## multiplyr                     4.186739e-05
## dfcrm                         4.185876e-05
## coinmarketcapr                4.185012e-05
## ptycho                        4.182801e-05
## htmltab                       4.182637e-05
## UPMASK                        4.182465e-05
## OECD                          4.182134e-05
## ipfp                          4.182059e-05
## ryouready                     4.181422e-05
## backblazer                    4.180508e-05
## gambin                        4.180456e-05
## rCAT                          4.180416e-05
## parsedate                     4.180407e-05
## FastRCS                       4.179796e-05
## XRPython                      4.179618e-05
## betalink                      4.178622e-05
## fmdates                       4.178544e-05
## RATest                        4.178216e-05
## ROI.plugin.lpsolve            4.177629e-05
## sValues                       4.175976e-05
## sitmo                         4.175304e-05
## RKEAjars                      4.175284e-05
## Rlinkedin                     4.175180e-05
## Rexperigen                    4.174357e-05
## qrcmNP                        4.173249e-05
## quantregRanger                4.173124e-05
## quadmesh                      4.172960e-05
## PhysActBedRest                4.171722e-05
## bookdownplus                  4.171429e-05
## RcppTOML                      4.171224e-05
## stringb                       4.171121e-05
## debug                         4.170995e-05
## FuncMap                       4.170995e-05
## diverse                       4.170965e-05
## GetoptLong                    4.170385e-05
## rworldxtra                    4.169975e-05
## bsamGP                        4.169641e-05
## dynsim                        4.169641e-05
## lindia                        4.169641e-05
## dbhydroR                      4.169573e-05
## TimeProjection                4.169054e-05
## komadown                      4.168683e-05
## clusternomics                 4.165652e-05
## readstata13                   4.165329e-05
## ROAuth                        4.164114e-05
## FinCal                        4.162112e-05
## kzfs                          4.162096e-05
## MigClim                       4.161259e-05
## rWind                         4.161127e-05
## rHealthDataGov                4.160791e-05
## uaparserjs                    4.160462e-05
## multiROC                      4.159678e-05
## isoph                         4.157612e-05
## lifecontingencies             4.157261e-05
## GSparO                        4.156400e-05
## dafs                          4.156152e-05
## GlobalOptions                 4.156131e-05
## MetaQC                        4.156103e-05
## BrownDog                      4.154442e-05
## GrassmannOptim                4.154255e-05
## ldr                           4.154255e-05
## cmaes                         4.153948e-05
## rDotNet                       4.153851e-05
## saasCNV                       4.153622e-05
## RWildbook                     4.151957e-05
## NPHMC                         4.151629e-05
## SimDesign                     4.151425e-05
## aRxiv                         4.150271e-05
## DendroSync                    4.149630e-05
## PreKnitPostHTMLRender         4.149488e-05
## startR                        4.148844e-05
## NIRStat                       4.148656e-05
## nVennR                        4.148045e-05
## MKmisc                        4.147577e-05
## sirad                         4.147514e-05
## BiDAG                         4.147473e-05
## tsna                          4.146529e-05
## RSPS                          4.146064e-05
## rrefine                       4.145145e-05
## oompaData                     4.144803e-05
## PdPDB                         4.143729e-05
## R3port                        4.143050e-05
## RQuantLib                     4.142606e-05
## dynetNLAResistance            4.142582e-05
## pocrm                         4.142319e-05
## SPODT                         4.141903e-05
## zip                           4.141572e-05
## ica                           4.140359e-05
## hR                            4.138518e-05
## marinespeed                   4.138241e-05
## Digiroo2                      4.138143e-05
## optimization                  4.137977e-05
## word.alignment                4.137862e-05
## acepack                       4.137718e-05
## ecp                           4.137595e-05
## aws.ec2metadata               4.136539e-05
## bcpa                          4.136298e-05
## segmag                        4.136298e-05
## hbm                           4.136231e-05
## INLABMA                       4.136115e-05
## ModelMetrics                  4.135831e-05
## lucr                          4.135129e-05
## rgeolocate                    4.135129e-05
## GGIR                          4.134720e-05
## noncompliance                 4.134720e-05
## pgs                           4.134605e-05
## virustotal                    4.131948e-05
## RcppAnnoy                     4.129528e-05
## smpic                         4.129181e-05
## triebeard                     4.128885e-05
## phylocanvas                   4.128373e-05
## highr                         4.127974e-05
## MOQA                          4.127858e-05
## strap                         4.127752e-05
## bayesAB                       4.126740e-05
## fbroc                         4.126740e-05
## mixR                          4.126740e-05
## mlmc                          4.126740e-05
## BSgenome                      4.124832e-05
## rgeoapi                       4.123231e-05
## rpinterest                    4.123231e-05
## flows                         4.120902e-05
## mmod                          4.120477e-05
## solarius                      4.119691e-05
## refinr                        4.118717e-05
## rdnb                          4.118607e-05
## cmpprocess                    4.118540e-05
## moezipfR                      4.116797e-05
## zipfextR                      4.116797e-05
## etseed                        4.116151e-05
## RonFHIR                       4.116151e-05
## pack                          4.116111e-05
## instaR                        4.115711e-05
## ALS                           4.113941e-05
## CPsurv                        4.112969e-05
## easyDes                       4.111629e-05
## GoodmanKruskal                4.110339e-05
## RRreg                         4.110242e-05
## rcoreoa                       4.110241e-05
## jwutil                        4.107471e-05
## lasvmR                        4.107471e-05
## fastrtext                     4.107062e-05
## IMFData                       4.106821e-05
## googlePrintr                  4.106754e-05
## humanleague                   4.105925e-05
## rGoodData                     4.105243e-05
## moveWindSpeed                 4.103488e-05
## IBDsim                        4.103341e-05
## esaps                         4.103150e-05
## asreml                        4.101944e-05
## TOC                           4.101828e-05
## AdaptiveSparsity              4.097853e-05
## arrApply                      4.097853e-05
## attrCUSUM                     4.097853e-05
## Barycenter                    4.097853e-05
## bayesImageS                   4.097853e-05
## belg                          4.097853e-05
## BIPOD                         4.097853e-05
## BosonSampling                 4.097853e-05
## changepointsHD                4.097853e-05
## CircularDDM                   4.097853e-05
## cIRT                          4.097853e-05
## cord                          4.097853e-05
## CoxPlus                       4.097853e-05
## DatAssim                      4.097853e-05
## dina                          4.097853e-05
## DrImpute                      4.097853e-05
## ECctmc                        4.097853e-05
## EloChoice                     4.097853e-05
## ensembleEN                    4.097853e-05
## FarmTest                      4.097853e-05
## FastBandChol                  4.097853e-05
## fastM                         4.097853e-05
## FBFsearch                     4.097853e-05
## fourierin                     4.097853e-05
## fourPNO                       4.097853e-05
## FUNLDA                        4.097853e-05
## gaselect                      4.097853e-05
## gcKrig                        4.097853e-05
## geoCount                      4.097853e-05
## glcm                          4.097853e-05
## glmgraph                      4.097853e-05
## GMCM                          4.097853e-05
## GraphKit                      4.097853e-05
## GreedyEPL                     4.097853e-05
## GreedySBTM                    4.097853e-05
## hawkes                        4.097853e-05
## hkevp                         4.097853e-05
## icamix                        4.097853e-05
## iccbeta                       4.097853e-05
## jmotif                        4.097853e-05
## KODAMA                        4.097853e-05
## l0ara                         4.097853e-05
## Langevin                      4.097853e-05
## lowmemtkmeans                 4.097853e-05
## ManifoldOptim                 4.097853e-05
## MAT                           4.097853e-05
## matchingR                     4.097853e-05
## mcIRT                         4.097853e-05
## MetaheuristicFPA              4.097853e-05
## miceFast                      4.097853e-05
## mp                            4.097853e-05
## Mposterior                    4.097853e-05
## mvcluster                     4.097853e-05
## ncpen                         4.097853e-05
## PieceExpIntensity             4.097853e-05
## PoweR                         4.097853e-05
## PWD                           4.097853e-05
## RcppHMM                       4.097853e-05
## RcppSMC                       4.097853e-05
## rdist                         4.097853e-05
## revealedPrefs                 4.097853e-05
## rgam                          4.097853e-05
## rpms                          4.097853e-05
## SAMM                          4.097853e-05
## sbmSDP                        4.097853e-05
## SBSA                          4.097853e-05
## SFS                           4.097853e-05
## SMMA                          4.097853e-05
## SpaTimeClus                   4.097853e-05
## StepwiseTest                  4.097853e-05
## SubTite                       4.097853e-05
## SVMMatch                      4.097853e-05
## TauStar                       4.097853e-05
## varband                       4.097853e-05
## vlad                          4.097853e-05
## ziphsmm                       4.097853e-05
## RmecabKo                      4.096874e-05
## mwaved                        4.096806e-05
## BsMD                          4.095835e-05
## datacheck                     4.095768e-05
## r2dRue                        4.093579e-05
## mcparallelDo                  4.092940e-05
## variosig                      4.092825e-05
## crtests                       4.090935e-05
## statquotes                    4.089625e-05
## kirby21.fmri                  4.088761e-05
## kirby21.t1                    4.088761e-05
## nparACT                       4.088153e-05
## rmake                         4.087850e-05
## moduleColor                   4.085400e-05
## btb                           4.084891e-05
## gwfa                          4.084891e-05
## tbart                         4.084891e-05
## LowWAFOMNX                    4.084632e-05
## LowWAFOMSobol                 4.084632e-05
## msde                          4.083382e-05
## recosystem                    4.083382e-05
## ltsk                          4.081962e-05
## kmcudaR                       4.081920e-05
## MediaK                        4.081920e-05
## Rankcluster                   4.081920e-05
## rEDM                          4.081920e-05
## RZigZag                       4.081920e-05
## saturnin                      4.081920e-05
## StepReg                       4.081920e-05
## tmg                           4.081920e-05
## obAnalytics                   4.081840e-05
## wql                           4.081840e-05
## shp2graph                     4.080001e-05
## FunChisq                      4.079238e-05
## lclGWAS                       4.079238e-05
## mmapcharr                     4.079238e-05
## odeintr                       4.079238e-05
## phonics                       4.079238e-05
## Rblpapi                       4.079238e-05
## RcppBDT                       4.079238e-05
## RcppMsgPack                   4.079238e-05
## RcppQuantuccia                4.079238e-05
## RcppStreams                   4.079238e-05
## rxylib                        4.079238e-05
## strider                       4.079238e-05
## TransferEntropy               4.079238e-05
## elastic                       4.076448e-05
## federalregister               4.076448e-05
## pageviews                     4.076448e-05
## RPublica                      4.076448e-05
## ggparallel                    4.075532e-05
## landscapeR                    4.073954e-05
## tweenr                        4.073856e-05
## irtDemo                       4.073672e-05
## TSTr                          4.072244e-05
## charlatan                     4.071031e-05
## parallelSVM                   4.070671e-05
## PMCMR                         4.070629e-05
## rbi                           4.070257e-05
## DensParcorr                   4.068901e-05
## SMM                           4.068444e-05
## jsTree                        4.068018e-05
## promote                       4.067397e-05
## urlshorteneR                  4.067397e-05
## yhatr                         4.067397e-05
## AutoDeskR                     4.067328e-05
## fat2Lpoly                     4.062316e-05
## oligo                         4.060748e-05
## AcrossTic                     4.060726e-05
## ggmuller                      4.060518e-05
## taxonomizr                    4.059193e-05
## MTA                           4.057980e-05
## prism                         4.057755e-05
## mscsweblm4r                   4.057044e-05
## future.BatchJobs              4.055898e-05
## RGBM                          4.055363e-05
## Icens                         4.054862e-05
## IDmining                      4.053785e-05
## mortAAR                       4.050552e-05
## wildlifeDI                    4.050211e-05
## udapi                         4.049940e-05
## boostSeq                      4.049203e-05
## ezknitr                       4.048553e-05
## DCM                           4.048452e-05
## OIsurv                        4.045923e-05
## pccc                          4.045779e-05
## refund.wave                   4.045750e-05
## MOCCA                         4.045535e-05
## hyphenatr                     4.044653e-05
## cycleRtools                   4.042832e-05
## boostr                        4.042605e-05
## flacco                        4.040297e-05
## ldlasso                       4.040175e-05
## RSwissMaps                    4.039788e-05
## showtextdb                    4.039734e-05
## simMSM                        4.038147e-05
## keyholder                     4.037898e-05
## chromer                       4.037560e-05
## RootsExtremaInflections       4.037092e-05
## sms                           4.037092e-05
## UScensus2000cdp               4.036918e-05
## UScensus2000tract             4.036918e-05
## mapReasy                      4.036825e-05
## lda                           4.036273e-05
## FreqProf                      4.036039e-05
## condMVNorm                    4.035503e-05
## vertexenum                    4.033631e-05
## sFFLHD                        4.033595e-05
## forestr                       4.030749e-05
## gradientPickerD3              4.030103e-05
## shinyjqui                     4.030103e-05
## climextRemes                  4.029797e-05
## EML                           4.029612e-05
## ElastH                        4.029597e-05
## cleanNLP                      4.029531e-05
## ipdw                          4.028852e-05
## fam2r                         4.027739e-05
## genomic.autocorr              4.025971e-05
## AutoSEARCH                    4.024585e-05
## lgarch                        4.024585e-05
## knitrBootstrap                4.023274e-05
## rticles                       4.022912e-05
## LDRTools                      4.022627e-05
## kgc                           4.022306e-05
## liso                          4.022175e-05
## locits                        4.021911e-05
## GHQp                          4.021101e-05
## Factoshiny                    4.020996e-05
## RGoogleAnalyticsPremium       4.017985e-05
## genderBR                      4.016302e-05
## hypothesisr                   4.016302e-05
## imfr                          4.016302e-05
## RCrypto                       4.016302e-05
## trelloR                       4.016302e-05
## WikidataQueryServiceR         4.016302e-05
## WufooR                        4.016302e-05
## ApacheLogProcessor            4.015939e-05
## Fuzzy.p.value                 4.015392e-05
## WordR                         4.015211e-05
## ClimClass                     4.014555e-05
## sensitivity2x2xk              4.014038e-05
## LakeMetabolizer               4.013615e-05
## rLakeAnalyzer                 4.013615e-05
## dataverse                     4.013355e-05
## pbdNCDF4                      4.012768e-05
## horseshoe                     4.010262e-05
## autoencoder                   4.008739e-05
## webreadr                      4.008145e-05
## siggenes                      4.005871e-05
## SkyWatchr                     4.005588e-05
## ckanr                         4.004194e-05
## docuSignr                     4.004194e-05
## owmr                          4.004194e-05
## rcarbon                       4.003956e-05
## DiceEval                      4.002632e-05
## prepdat                       4.001928e-05
## mpmi                          3.999900e-05
## censusr                       3.999714e-05
## proPubBills                   3.999714e-05
## lazysql                       3.999373e-05
## spellcheckr                   3.999306e-05
## lpdensity                     3.996992e-05
## rddensity                     3.996992e-05
## cystiSim                      3.995320e-05
## speciesgeocodeR               3.994225e-05
## rleafmap                      3.993754e-05
## MIAmaxent                     3.993272e-05
## cshapes                       3.992782e-05
## spew                          3.992782e-05
## eel                           3.992439e-05
## fileplyr                      3.992230e-05
## rematch2                      3.991452e-05
## CrossScreening                3.990183e-05
## ensembleBMA                   3.988456e-05
## subscore                      3.986382e-05
## QGglmm                        3.985414e-05
## elasso                        3.983745e-05
## webglobe                      3.983436e-05
## goft                          3.979861e-05
## dml                           3.979782e-05
## datoramar                     3.979736e-05
## randNames                     3.979736e-05
## JOP                           3.978885e-05
## mljar                         3.978668e-05
## selection                     3.975831e-05
## MALDIquant                    3.975095e-05
## CopyDetect                    3.973340e-05
## diffeR                        3.972472e-05
## PortfolioEffectEstim          3.972035e-05
## soma                          3.971813e-05
## sendplot                      3.970051e-05
## senstrat                      3.969688e-05
## Rgretl                        3.969393e-05
## forestinventory               3.969291e-05
## GSAgm                         3.969285e-05
## SharpeR                       3.968707e-05
## resumer                       3.968437e-05
## jdx                           3.967879e-05
## BayHap                        3.965206e-05
## MultAlloc                     3.964007e-05
## karaoke                       3.964002e-05
## sdmpredictors                 3.963640e-05
## SpatialNP                     3.962109e-05
## breakage                      3.961538e-05
## fontBitstreamVera             3.960568e-05
## fontLiberation                3.960568e-05
## sparkavro                     3.960219e-05
## bcmaps                        3.959739e-05
## leaflet.minicharts            3.959326e-05
## covequal                      3.959284e-05
## pcev                          3.959284e-05
## modelfree                     3.958547e-05
## bayesboot                     3.958440e-05
## AWR.Athena                    3.956375e-05
## wbstats                       3.954844e-05
## breastCancerVDX               3.954508e-05
## ora                           3.954227e-05
## ROracle                       3.954227e-05
## rcdklibs                      3.954199e-05
## shinybootstrap2               3.952920e-05
## DIME                          3.952173e-05
## pseudo                        3.950305e-05
## MPINet                        3.948704e-05
## rCarto                        3.948490e-05
## tint                          3.948258e-05
## xslt                          3.946630e-05
## lasso2                        3.946311e-05
## PubBias                       3.946304e-05
## EcoVirtual                    3.945056e-05
## SLC                           3.945056e-05
## steepness                     3.945056e-05
## colf                          3.944348e-05
## usl                           3.944348e-05
## diffobj                       3.941680e-05
## unitizer                      3.941680e-05
## ambhasGW                      3.941106e-05
## rMR                           3.940974e-05
## imprProbEst                   3.939455e-05
## autoplotly                    3.938854e-05
## PANDA                         3.938816e-05
## multivator                    3.938654e-05
## shinyaframe                   3.937361e-05
## ycinterextra                  3.936986e-05
## notifyme                      3.936512e-05
## CrossValidate                 3.936135e-05
## rtop                          3.935103e-05
## LaplaceDeconv                 3.934717e-05
## ggsci                         3.933457e-05
## discgolf                      3.932686e-05
## smoothmest                    3.932321e-05
## saws                          3.931338e-05
## esmisc                        3.930772e-05
## rUnemploymentData             3.930663e-05
## DMMF                          3.930623e-05
## fastmaRching                  3.930623e-05
## water                         3.930623e-05
## rredlist                      3.930522e-05
## NAPPA                         3.929523e-05
## opendotaR                     3.928635e-05
## PSLM2015                      3.928123e-05
## blockmatrix                   3.927842e-05
## egg                           3.926759e-05
## ACSNMineR                     3.922310e-05
## crossmatch                    3.921979e-05
## survIDINRI                    3.921244e-05
## iC10TrainingData              3.920881e-05
## ggQQunif                      3.920871e-05
## qicharts2                     3.920871e-05
## seedCCA                       3.920454e-05
## KANT                          3.920270e-05
## Jmisc                         3.920112e-05
## gesis                         3.919868e-05
## googleformr                   3.919868e-05
## cmrutils                      3.919063e-05
## muir                          3.917657e-05
## cofeatureR                    3.917153e-05
## IAT                           3.917153e-05
## RcmdrPlugin.sutteForecastR    3.915246e-05
## nparsurv                      3.914965e-05
## overlap                       3.914645e-05
## pixels                        3.913943e-05
## tea                           3.913665e-05
## VisuClust                     3.912499e-05
## AsioHeaders                   3.912405e-05
## nscprepr                      3.912048e-05
## sybilccFBA                    3.911967e-05
## sybilEFBA                     3.911967e-05
## p3state.msm                   3.911547e-05
## SMVar                         3.911510e-05
## WaveLetLongMemory             3.910030e-05
## spMaps                        3.908417e-05
## isdparser                     3.907081e-05
## pcdpca                        3.906734e-05
## IGP                           3.904861e-05
## binomen                       3.903875e-05
## NormPsy                       3.903146e-05
## ASIP                          3.902188e-05
## WLreg                         3.901919e-05
## GenBinomApps                  3.900006e-05
## rPackedBar                    3.899700e-05
## fortunes                      3.899299e-05
## rmsfact                       3.899299e-05
## NonCompart                    3.899173e-05
## jaod                          3.899067e-05
## manhattanly                   3.898971e-05
## dbplot                        3.898546e-05
## optDesignSlopeInt             3.897648e-05
## coefficientalpha              3.897196e-05
## batchmeans                    3.896923e-05
## nlsMicrobio                   3.895238e-05
## Newdistns                     3.894902e-05
## copBasic                      3.894690e-05
## mokken                        3.892740e-05
## wqs                           3.892363e-05
## GSSE                          3.891031e-05
## fuzzr                         3.890458e-05
## DJL                           3.889852e-05
## packHV                        3.889591e-05
## BHH2                          3.889214e-05
## longurl                       3.886388e-05
## RankProd                      3.885905e-05
## FITSio                        3.885402e-05
## OptInterim                    3.884754e-05
## ShapePattern                  3.884308e-05
## pycno                         3.884123e-05
## params                        3.883641e-05
## radarchart                    3.883330e-05
## rgeopat2                      3.881835e-05
## banxicoR                      3.881614e-05
## RClimMAWGEN                   3.881327e-05
## humanize                      3.880965e-05
## ProbYX                        3.879529e-05
## mfp                           3.879005e-05
## ggQC                          3.878772e-05
## xmrr                          3.878772e-05
## XLConnectJars                 3.878614e-05
## binr                          3.876371e-05
## pmcgd                         3.872353e-05
## sasMap                        3.871605e-05
## semisupKernelPCA              3.870423e-05
## stoichcalc                    3.869424e-05
## spatialnbda                   3.869245e-05
## BimodalIndex                  3.867466e-05
## Inventorymodel                3.867041e-05
## lightsout                     3.863935e-05
## JGL                           3.862790e-05
## HDclassif                     3.861932e-05
## sld                           3.861907e-05
## icpsrdata                     3.860585e-05
## finiteruinprob                3.857601e-05
## statesRcontiguous             3.856266e-05
## insol                         3.854642e-05
## portfolioSim                  3.850824e-05
## LBE                           3.847993e-05
## GMSE                          3.846908e-05
## RSpincalc                     3.846297e-05
## hot.deck                      3.845472e-05
## Ball                          3.844978e-05
## beadarrayFilter               3.844033e-05
## odfWeave.survey               3.844015e-05
## iopsych                       3.843862e-05
## cudaBayesregData              3.843805e-05
## OpenMPController              3.842540e-05
## sensitivityfull               3.842540e-05
## tsbugs                        3.842540e-05
## ggbuildr                      3.840366e-05
## PakPC2017                     3.839790e-05
## profile                       3.838608e-05
## nsga2R                        3.836955e-05
## mzR                           3.836241e-05
## tmuxr                         3.836027e-05
## teigen                        3.833938e-05
## Tmisc                         3.828810e-05
## ROI.plugin.alabama            3.828465e-05
## OTRselect                     3.828398e-05
## optrees                       3.828341e-05
## RefFreeEWAS                   3.827736e-05
## CNprep                        3.826565e-05
## GAMBoost                      3.826515e-05
## lfa                           3.824741e-05
## fdrDiscreteNull               3.824387e-05
## DendSer                       3.824272e-05
## rsoi                          3.823318e-05
## LMest                         3.823062e-05
## lumberjack                    3.822308e-05
## marray                        3.822044e-05
## aster2                        3.821904e-05
## deTestSet                     3.819158e-05
## cptec                         3.818411e-05
## KEGG.db                       3.817527e-05
## org.Sc.sgd.db                 3.817527e-05
## org.Ag.eg.db                  3.817527e-05
## org.Pt.eg.db                  3.817527e-05
## org.Rn.eg.db                  3.817527e-05
## org.Ss.eg.db                  3.817527e-05
## org.At.tair.db                3.817527e-05
## org.Bt.eg.db                  3.817527e-05
## org.Ce.eg.db                  3.817527e-05
## org.Cf.eg.db                  3.817527e-05
## org.Dm.eg.db                  3.817527e-05
## org.Dr.eg.db                  3.817527e-05
## org.EcK12.eg.db               3.817527e-05
## org.EcSakai.eg.db             3.817527e-05
## org.Gg.eg.db                  3.817527e-05
## org.Mm.eg.db                  3.817527e-05
## org.Mmu.eg.db                 3.817527e-05
## org.Pf.plasmo.db              3.817527e-05
## org.Xl.eg.db                  3.817527e-05
## scrime                        3.816811e-05
## compareDF                     3.815669e-05
## EffectsRelBaseline            3.815416e-05
## IDF                           3.813377e-05
## mixsmsn                       3.811607e-05
## flatr                         3.810596e-05
## VdgRsm                        3.810553e-05
## RHMS                          3.809490e-05
## prefeR                        3.809046e-05
## RadTran                       3.809004e-05
## rysgran                       3.807108e-05
## pks                           3.805089e-05
## datasets.load                 3.804864e-05
## infuser                       3.804860e-05
## Rpdb                          3.803220e-05
## snowFT                        3.800461e-05
## rtrends                       3.799495e-05
## emg                           3.799365e-05
## plotfunctions                 3.799069e-05
## pollen                        3.798722e-05
## benthos                       3.798559e-05
## MatchLinReg                   3.796906e-05
## HotDeckImputation             3.796407e-05
## Power2Stage                   3.795151e-05
## GExMap                        3.794652e-05
## OptimalTiming                 3.792647e-05
## currentSurvival               3.791467e-05
## Rearrangement                 3.790389e-05
## PsyControl                    3.789399e-05
## investr                       3.787545e-05
## GUIDE                         3.787081e-05
## boilerpipeR                   3.786688e-05
## LncPath                       3.785971e-05
## engsoccerdata                 3.785704e-05
## SCI                           3.785302e-05
## GenomicAlignments             3.783774e-05
## textfeatures                  3.781019e-05
## unjoin                        3.781019e-05
## GEOmetadb                     3.780144e-05
## cancerTiming                  3.779909e-05
## igraphdata                    3.779608e-05
## gfmR                          3.779390e-05
## personograph                  3.778566e-05
## CNTools                       3.778566e-05
## grr                           3.775383e-05
## AssetPricing                  3.775359e-05
## unfoldr                       3.775016e-05
## ROI.plugin.optimx             3.774976e-05
## extdplyr                      3.774735e-05
## LIM                           3.773792e-05
## mvinfluence                   3.772115e-05
## ctl                           3.771295e-05
## rTensor                       3.769811e-05
## MultinomialCI                 3.769628e-05
## PHENIX                        3.769522e-05
## diagmeta                      3.767152e-05
## cepp                          3.765252e-05
## arulesNBMiner                 3.763661e-05
## haplo.ccs                     3.763652e-05
## topmodel                      3.763479e-05
## OpenCL                        3.761768e-05
## powerGWASinteraction          3.761438e-05
## FFD                           3.760220e-05
## sparcl                        3.759342e-05
## lmomRFA                       3.758787e-05
## bayesmeta                     3.757650e-05
## catmap                        3.757650e-05
## rasterImage                   3.756163e-05
## InjurySeverityScore           3.756128e-05
## sft                           3.755982e-05
## jsonvalidate                  3.754624e-05
## codingMatrices                3.754493e-05
## HistData                      3.754374e-05
## time2event                    3.753169e-05
## bartMachineJARs               3.752597e-05
## Bolstad2                      3.752587e-05
## TeachingSampling              3.752312e-05
## rFDSN                         3.751164e-05
## luca                          3.751146e-05
## galts                         3.750330e-05
## RCEIM                         3.749748e-05
## speff2trial                   3.746720e-05
## SOPIE                         3.745993e-05
## HSSVD                         3.743946e-05
## ROlogit                       3.743246e-05
## Tcomp                         3.740542e-05
## mExplorer                     3.739863e-05
## futile.any                    3.739599e-05
## seqICP                        3.739575e-05
## RockFab                       3.738558e-05
## logbin                        3.738056e-05
## fastHICA                      3.736220e-05
## educineq                      3.735404e-05
## AUCRF                         3.734930e-05
## futile.paradigm               3.733142e-05
## BayesGOF                      3.732342e-05
## ROI.plugin.nloptr             3.731909e-05
## minval                        3.731490e-05
## plgp                          3.730815e-05
## ShapeChange                   3.729598e-05
## deseasonalize                 3.728806e-05
## conjoint                      3.727527e-05
## LDOD                          3.727128e-05
## acss.data                     3.725773e-05
## tracheideR                    3.725773e-05
## getMet                        3.724539e-05
## pingr                         3.724530e-05
## quhomology                    3.723812e-05
## rdwd                          3.722318e-05
## sgof                          3.721140e-05
## scdensity                     3.720977e-05
## xtermStyle                    3.720526e-05
## directPA                      3.720027e-05
## locfdr                        3.718823e-05
## lineup                        3.717834e-05
## cryst                         3.716962e-05
## gsbDesign                     3.716857e-05
## SummarizedExperiment          3.716224e-05
## braidrm                       3.715216e-05
## interactionTest               3.715216e-05
## RadioSonde                    3.715216e-05
## Interpol.T                    3.713884e-05
## cytoDiv                       3.713840e-05
## bandit                        3.713125e-05
## RcmdrPlugin.lfstat            3.712585e-05
## dgof                          3.712507e-05
## tipr                          3.711190e-05
## givitiR                       3.709280e-05
## CTM                           3.708881e-05
## sigr                          3.708304e-05
## breakDown                     3.707583e-05
## ROI.plugin.msbinlp            3.706931e-05
## simrel                        3.706850e-05
## frmqa                         3.705132e-05
## hoa                           3.703996e-05
## nlreg                         3.703996e-05
## hpcwld                        3.703655e-05
## scaleboot                     3.703579e-05
## boostmtree                    3.703393e-05
## fast                          3.699993e-05
## gamlss.nl                     3.697750e-05
## iGasso                        3.696797e-05
## effsize                       3.696649e-05
## TSF                           3.696585e-05
## BSSasymp                      3.695873e-05
## filenamer                     3.695345e-05
## rstackdeque                   3.695345e-05
## ExactPath                     3.695301e-05
## sigmoid                       3.695299e-05
## BivUnifBin                    3.695152e-05
## edgeRun                       3.694818e-05
## changepointsVar               3.692961e-05
## kmi                           3.692623e-05
## mvsf                          3.692513e-05
## MDPtoolbox                    3.692207e-05
## forensic                      3.691904e-05
## TBEST                         3.690866e-05
## oaPlots                       3.689110e-05
## packrat                       3.688966e-05
## wnominate                     3.687702e-05
## LncMod                        3.687509e-05
## pim                           3.687357e-05
## trimcluster                   3.686565e-05
## MAR1                          3.686270e-05
## rgr                           3.685154e-05
## readHAC                       3.681004e-05
## polySegratio                  3.678515e-05
## riskyr                        3.677994e-05
## factoptd                      3.677009e-05
## ERP                           3.675626e-05
## MRsurv                        3.674019e-05
## simexaft                      3.674019e-05
## sp23design                    3.674019e-05
## VarReg                        3.672428e-05
## simest                        3.672426e-05
## hotspots                      3.672006e-05
## BMT                           3.671501e-05
## hdpca                         3.670789e-05
## SQN                           3.670443e-05
## orderbook                     3.670219e-05
## profileModel                  3.670114e-05
## SmartSifter                   3.669299e-05
## weightedScores                3.669299e-05
## cordillera                    3.668942e-05
## Aoptbdtvc                     3.667205e-05
## rsvg                          3.666181e-05
## landpred                      3.666142e-05
## FAMT                          3.666021e-05
## ROMIplot                      3.665939e-05
## pltesim                       3.665043e-05
## DRIP                          3.663516e-05
## trimTrees                     3.662657e-05
## iWeigReg                      3.661373e-05
## cointmonitoR                  3.661372e-05
## EpiEstim                      3.661108e-05
## binMto                        3.660911e-05
## invGauss                      3.660511e-05
## RNetLogo                      3.659843e-05
## CosW                          3.659728e-05
## SecKW                         3.659728e-05
## SinIW                         3.659728e-05
## TanB                          3.659728e-05
## RcmdrPlugin.plotByGroup       3.659523e-05
## FeaLect                       3.658570e-05
## coreNLP                       3.658276e-05
## upmfit                        3.657254e-05
## IalsaSynthesis                3.656489e-05
## SACOBRA                       3.656489e-05
## PCS                           3.656348e-05
## spData                        3.653856e-05
## globalboosttest               3.653751e-05
## Correlplot                    3.652889e-05
## Rdsdp                         3.652647e-05
## iterLap                       3.651884e-05
## JGEE                          3.650462e-05
## overlapping                   3.650178e-05
## aroma.light                   3.650019e-05
## STB                           3.649811e-05
## gogarch                       3.649693e-05
## threg                         3.649668e-05
## thregI                        3.649668e-05
## multipol                      3.649640e-05
## SoilR                         3.647586e-05
## BiodiversityR                 3.647550e-05
## HiClimR                       3.646744e-05
## monitoR                       3.646076e-05
## hapsim                        3.645955e-05
## SPEI                          3.643800e-05
## mallet                        3.642768e-05
## COSINE                        3.642510e-05
## caesar                        3.640229e-05
## NHPoisson                     3.640127e-05
## CatDyn                        3.639571e-05
## RXMCDA                        3.639142e-05
## cmprskQR                      3.638244e-05
## mglmn                         3.638079e-05
## Traitspace                    3.637960e-05
## bshazard                      3.635349e-05
## Interatrix                    3.634195e-05
## boxcoxmix                     3.633576e-05
## attribrisk                    3.633253e-05
## survsim                       3.632477e-05
## MTE                           3.631774e-05
## modQR                         3.630970e-05
## flowCore                      3.630503e-05
## nsROC                         3.629909e-05
## mmc                           3.629669e-05
## MPLikelihoodWB                3.629669e-05
## NestedCohort                  3.629669e-05
## RPCLR                         3.629669e-05
## survivalMPL                   3.629669e-05
## TransModel                    3.629669e-05
## SparseGrid                    3.629457e-05
## RcmdrPlugin.doex              3.628988e-05
## shades                        3.628428e-05
## CPBayes                       3.624710e-05
## BigSEM                        3.623200e-05
## naivereg                      3.621788e-05
## bmeta                         3.621769e-05
## ZeBook                        3.620279e-05
## permGS                        3.619416e-05
## isotonic.pen                  3.619242e-05
## errint                        3.618947e-05
## clogitLasso                   3.618795e-05
## hexView                       3.617283e-05
## rsubgroup                     3.616760e-05
## gwrr                          3.615915e-05
## DAKS                          3.615167e-05
## SNPmaxsel                     3.614777e-05
## fsdaR                         3.614739e-05
## kwb.hantush                   3.614032e-05
## REdaS                         3.614029e-05
## RcmdrPlugin.MPAStats          3.613500e-05
## evtree                        3.613251e-05
## SPREDA                        3.609658e-05
## compound.Cox                  3.609129e-05
## coxphMIC                      3.609129e-05
## SurvRegCensCov                3.609129e-05
## HMM                           3.609039e-05
## multipleNCC                   3.608684e-05
## condGEE                       3.604409e-05
## ipflasso                      3.603275e-05
## MMMS                          3.603275e-05
## pact                          3.603275e-05
## prioritylasso                 3.603275e-05
## Rgbp                          3.602886e-05
## sciplot                       3.601766e-05
## ConvergenceConcepts           3.601060e-05
## ReporteRsjars                 3.598737e-05
## sigloc                        3.598687e-05
## partitionComparison           3.597840e-05
## RcmdrPlugin.FactoMineR        3.596935e-05
## mixPHM                        3.596534e-05
## HAP.ROR                       3.595670e-05
## qtlcharts                     3.595448e-05
## lodGWAS                       3.595278e-05
## LCox                          3.595196e-05
## ETLUtils                      3.594245e-05
## iplots                        3.593493e-05
## dimRed                        3.592169e-05
## DCGL                          3.592006e-05
## BIOdry                        3.591980e-05
## stepp                         3.591794e-05
## cudia                         3.591127e-05
## HWEBayes                      3.591127e-05
## reams                         3.590298e-05
## bhm                           3.589928e-05
## sparsesvd                     3.589648e-05
## aSPC                          3.589647e-05
## venneuler                     3.589101e-05
## IFP                           3.588473e-05
## mederrRank                    3.588189e-05
## lqr                           3.588032e-05
## phonTools                     3.586811e-05
## dcemriS4                      3.586733e-05
## CORM                          3.584990e-05
## BlakerCI                      3.584419e-05
## AGD                           3.584394e-05
## semds                         3.584008e-05
## hddplot                       3.582021e-05
## BayesSummaryStatLM            3.581913e-05
## dynBiplotGUI                  3.581866e-05
## forensim                      3.581866e-05
## genasis                       3.581587e-05
## GenForImp                     3.581341e-05
## fit.models                    3.581195e-05
## DMRnet                        3.579665e-05
## mRMRe                         3.579436e-05
## features                      3.579245e-05
## LEAPFrOG                      3.578563e-05
## meteR                         3.577787e-05
## wesanderson                   3.576366e-05
## microcontax                   3.576277e-05
## rpst                          3.574554e-05
## BayesXsrc                     3.574304e-05
## empiricalFDR.DESeq2           3.573065e-05
## LDPD                          3.572859e-05
## ssrm.logmer                   3.572733e-05
## base2grob                     3.570346e-05
## qclust                        3.570003e-05
## randomizationInference        3.569698e-05
## ODB                           3.568931e-05
## plsdof                        3.568874e-05
## EXRQ                          3.568702e-05
## BayesianGLasso                3.568560e-05
## rpart.utils                   3.568006e-05
## gepaf                         3.567231e-05
## mcll                          3.567176e-05
## ZIM                           3.566247e-05
## SNPRelate                     3.565949e-05
## NEpiC                         3.565819e-05
## Storm                         3.565287e-05
## snpStatsWriter                3.564529e-05
## multiway                      3.564047e-05
## utf8                          3.563451e-05
## causalweight                  3.562391e-05
## lmomPi                        3.561983e-05
## COUSCOus                      3.561796e-05
## lmodel2                       3.561409e-05
## anchors                       3.560903e-05
## DelayedEffect.Design          3.560876e-05
## WPC                           3.560876e-05
## pensim                        3.560229e-05
## dma                           3.560127e-05
## CHsharp                       3.559769e-05
## ldbod                         3.559760e-05
## gglorenz                      3.558130e-05
## munsellinterpol               3.557394e-05
## COMBAT                        3.556180e-05
## GLSME                         3.556180e-05
## LinRegInteractive             3.556075e-05
## unifDAG                       3.555866e-05
## acnr                          3.555732e-05
## SegCorr                       3.555732e-05
## GPoM                          3.555082e-05
## Actigraphy                    3.554634e-05
## snpEnrichment                 3.553292e-05
## sparseMVN                     3.549796e-05
## sfadv                         3.549741e-05
## grpregOverlap                 3.549475e-05
## subtype                       3.549156e-05
## Rd2roxygen                    3.548163e-05
## EnsemblePenReg                3.548161e-05
## bpca                          3.548062e-05
## NlcOptim                      3.548004e-05
## wSVM                          3.548004e-05
## PCDSpline                     3.547600e-05
## lbfgsb3                       3.547424e-05
## mztwinreg                     3.547268e-05
## FindMinIC                     3.547062e-05
## NSUM                          3.546778e-05
## mcgibbsit                     3.546169e-05
## primer                        3.545852e-05
## EnergyOnlineCPM               3.545298e-05
## VertexSort                    3.544226e-05
## simboot                       3.542166e-05
## AFLPsim                       3.541720e-05
## RcmdrPlugin.pointG            3.539398e-05
## CircOutlier                   3.539217e-05
## FisherEM                      3.539135e-05
## seqDesign                     3.538626e-05
## BayesVarSel                   3.538582e-05
## BNPTSclust                    3.538582e-05
## EMC                           3.538582e-05
## FactMixtAnalysis              3.538582e-05
## freestats                     3.538582e-05
## kernscr                       3.538582e-05
## LogConcDEAD                   3.538582e-05
## mvnTest                       3.538582e-05
## PGEE                          3.538582e-05
## powerCompRisk                 3.538582e-05
## RAD                           3.538582e-05
## Stem                          3.538582e-05
## msos                          3.537137e-05
## WaverR                        3.536950e-05
## zipfR                         3.536495e-05
## flifo                         3.535708e-05
## HKprocess                     3.534418e-05
## srp                           3.534249e-05
## rquery                        3.532696e-05
## episplineDensity              3.532004e-05
## lmmot                         3.531930e-05
## RTriangle                     3.530965e-05
## nomclust                      3.530956e-05
## xbreed                        3.530214e-05
## dtt                           3.529595e-05
## CHCN                          3.529552e-05
## permPATH                      3.529214e-05
## mlt.docreg                    3.528418e-05
## fso                           3.527919e-05
## EffectStars2                  3.527621e-05
## compeir                       3.527508e-05
## SAVE                          3.526263e-05
## Synth                         3.526231e-05
## supcluster                    3.526222e-05
## KScorrect                     3.525654e-05
## SNPMClust                     3.525654e-05
## venn                          3.525408e-05
## TapeR                         3.524217e-05
## quantchem                     3.523967e-05
## ecolottery                    3.523473e-05
## rma.exact                     3.523079e-05
## baseline                      3.522929e-05
## npmv                          3.522397e-05
## pendensity                    3.522099e-05
## palmtree                      3.521201e-05
## trajr                         3.520251e-05
## pampe                         3.520240e-05
## stinepack                     3.519637e-05
## WhiteStripe                   3.519498e-05
## mmap                          3.519080e-05
## DSviaDRM                      3.518541e-05
## polyclip                      3.518487e-05
## bnormnlr                      3.518041e-05
## fgof                          3.518041e-05
## threshr                       3.517736e-05
## reddPrec                      3.517413e-05
## multiCA                       3.516755e-05
## ceg                           3.515295e-05
## classGraph                    3.515295e-05
## hasseDiagram                  3.515295e-05
## cellVolumeDist                3.514387e-05
## crackR                        3.514215e-05
## HydroMe                       3.514000e-05
## MomTrunc                      3.513322e-05
## GESTr                         3.513294e-05
## regsel                        3.512741e-05
## abundant                      3.511549e-05
## MRCE                          3.511549e-05
## pdc                           3.511478e-05
## sgPLS                         3.511435e-05
## nomogramEx                    3.509837e-05
## FAMILY                        3.508934e-05
## fdcov                         3.506458e-05
## bestNormalize                 3.505986e-05
## MCPMod                        3.505447e-05
## DIFtree                       3.505114e-05
## regress                       3.505065e-05
## AbSim                         3.504896e-05
## nlmeU                         3.504508e-05
## LSAfun                        3.504128e-05
## icesVocab                     3.503813e-05
## qrmix                         3.502807e-05
## DGCA                          3.502400e-05
## rotationForest                3.502155e-05
## msir                          3.501749e-05
## spaceExt                      3.501742e-05
## gbs2ploidy                    3.500891e-05
## bayesGARCH                    3.498840e-05
## BAYSTAR                       3.498840e-05
## QoLR                          3.498525e-05
## sgee                          3.498394e-05
## experiment                    3.497816e-05
## extremogram                   3.497816e-05
## QuantPsyc                     3.497816e-05
## growthcurver                  3.497003e-05
## spate                         3.496007e-05
## nanop                         3.495867e-05
## kfda                          3.495390e-05
## SpectralMap                   3.494921e-05
## SPIn                          3.494916e-05
## ConfigParser                  3.494816e-05
## tkrgl                         3.494540e-05
## INLA                          3.492527e-05
## Bayesianbetareg               3.492223e-05
## WCE                           3.492217e-05
## FWDselect                     3.492206e-05
## RSarules                      3.491233e-05
## beginr                        3.490934e-05
## prefmod                       3.490714e-05
## nontargetData                 3.490609e-05
## pmhtutorial                   3.489776e-05
## TE                            3.489188e-05
## geofd                         3.489051e-05
## MRSP                          3.488971e-05
## MBC                           3.488714e-05
## grec                          3.487265e-05
## GPCSIV                        3.486913e-05
## Comp2ROC                      3.486743e-05
## TRD                           3.486183e-05
## LSMonteCarlo                  3.486169e-05
## SCBmeanfd                     3.485619e-05
## CDVineCopulaConditional       3.485612e-05
## Rothermel                     3.484549e-05
## dpa                           3.484264e-05
## dpmixsim                      3.483233e-05
## QualInt                       3.482659e-05
## mpm                           3.482035e-05
## nlshrink                      3.482007e-05
## mmmgee                        3.481998e-05
## optismixture                  3.481998e-05
## rmpw                          3.481873e-05
## RM.weights                    3.481531e-05
## replicatedpp2w                3.480810e-05
## spatstat.data                 3.480810e-05
## ConfoundedMeta                3.480161e-05
## EValue                        3.480161e-05
## RODBCDBI                      3.479673e-05
## Tsphere                       3.479632e-05
## nodeHarvest                   3.478271e-05
## SizeEstimation                3.477985e-05
## Density.T.HoldOut             3.477795e-05
## TTS                           3.477420e-05
## BalanceCheck                  3.477303e-05
## gamRR                         3.476831e-05
## supraHex                      3.476098e-05
## parviol                       3.475635e-05
## crn                           3.475063e-05
## customizedTraining            3.474984e-05
## betaper                       3.474952e-05
## multisom                      3.474543e-05
## ockc                          3.474313e-05
## BioPhysConnectoR              3.474290e-05
## FRB                           3.474252e-05
## lmfor                         3.474221e-05
## LVMMCOR                       3.474221e-05
## fame                          3.473703e-05
## IPEC                          3.473692e-05
## SpeciesMix                    3.473692e-05
## stochprofML                   3.473692e-05
## ThreeArmedTrials              3.473692e-05
## emon                          3.473247e-05
## interpretR                    3.472801e-05
## nortestARMA                   3.472721e-05
## expoTree                      3.471303e-05
## infutil                       3.469796e-05
## modcmfitr                     3.469648e-05
## omics                         3.469499e-05
## daff                          3.469396e-05
## dbarts                        3.469150e-05
## mro                           3.468973e-05
## Skillings.Mack                3.468973e-05
## maboost                       3.468139e-05
## eshrink                       3.467838e-05
## TSGSIS                        3.467838e-05
## matlabr                       3.467489e-05
## emma                          3.466103e-05
## PhyloMeasures                 3.464868e-05
## lga                           3.464681e-05
## tolBasis                      3.464316e-05
## dyads                         3.464246e-05
## informR                       3.463854e-05
## dtables                       3.463055e-05
## rsparkling                    3.462603e-05
## ExplainPrediction             3.461534e-05
## bayesmix                      3.461150e-05
## bdpopt                        3.461150e-05
## lira                          3.461150e-05
## pcnetmeta                     3.461150e-05
## prevalence                    3.461150e-05
## agsemisc                      3.461097e-05
## Blendstat                     3.461097e-05
## Devore7                       3.461097e-05
## spuRs                         3.461097e-05
## lmeSplines                    3.459560e-05
## simplexreg                    3.459116e-05
## DandEFA                       3.459052e-05
## optimus                       3.458695e-05
## dunn.test                     3.458498e-05
## mhsmm                         3.457843e-05
## moult                         3.457647e-05
## arrangements                  3.456556e-05
## pspearman                     3.456302e-05
## cramer                        3.455659e-05
## SpecHelpers                   3.455565e-05
## iTOP                          3.455247e-05
## NORTARA                       3.455247e-05
## odk                           3.455085e-05
## mcsm                          3.454491e-05
## EasyStrata                    3.453695e-05
## mgarchBEKK                    3.453115e-05
## separationplot                3.452801e-05
## rich                          3.452709e-05
## ocomposition                  3.452648e-05
## DWDLargeR                     3.451927e-05
## BRugs                         3.451676e-05
## wpp2015                       3.451599e-05
## rodeo                         3.450865e-05
## EILA                          3.449346e-05
## CePa                          3.449316e-05
## MetProc                       3.448852e-05
## fanplot                       3.448183e-05
## remotes                       3.447798e-05
## FatTailsR                     3.447663e-05
## RFGLS                         3.446175e-05
## GMMBoost                      3.445507e-05
## DisHet                        3.445032e-05
## ArgumentCheck                 3.444050e-05
## pop                           3.443999e-05
## statGraph                     3.443999e-05
## multisensi                    3.443640e-05
## causaldrf                     3.443130e-05
## PST                           3.442851e-05
## R2ucare                       3.442809e-05
## rainfreq                      3.442760e-05
## smoothtail                    3.442405e-05
## Ultimixt                      3.442131e-05
## kpeaks                        3.441825e-05
## CoClust                       3.441685e-05
## assist                        3.441086e-05
## RPEnsemble                    3.440771e-05
## eHOF                          3.440113e-05
## TreeSimGM                     3.439941e-05
## codyn                         3.439850e-05
## rowr                          3.439305e-05
## coRanking                     3.439221e-05
## astro                         3.439117e-05
## alr4                          3.438946e-05
## ElstonStewart                 3.438627e-05
## fds                           3.438316e-05
## XVector                       3.437670e-05
## abnormality                   3.437648e-05
## asnipe                        3.437648e-05
## brant                         3.437648e-05
## chords                        3.437648e-05
## crisp                         3.437648e-05
## GeoDE                         3.437648e-05
## gwerAM                        3.437648e-05
## mme                           3.437648e-05
## msda                          3.437648e-05
## qgtools                       3.437648e-05
## sSDR                          3.437648e-05
## spa                           3.436982e-05
## sparseBC                      3.436977e-05
## easyanova                     3.436346e-05
## easyreg                       3.436346e-05
## fitplc                        3.436346e-05
## popdemo                       3.435701e-05
## plspolychaos                  3.434216e-05
## polychaosbasics               3.434216e-05
## alphashape3d                  3.434092e-05
## imPois                        3.434092e-05
## bayesDccGarch                 3.433950e-05
## compete                       3.433884e-05
## HAC                           3.433504e-05
## matlib                        3.432452e-05
## svapls                        3.432349e-05
## a4Core                        3.432297e-05
## pauwels2014                   3.431976e-05
## modMax                        3.431639e-05
## PIGShift                      3.430898e-05
## CIplot                        3.430563e-05
## multifluo                     3.429943e-05
## SRRS                          3.429544e-05
## dbstats                       3.428561e-05
## cccrm                         3.427925e-05
## mmtfa                         3.427405e-05
## accelmissing                  3.426983e-05
## VizOR                         3.426706e-05
## DRaWR                         3.426575e-05
## changepoint.np                3.425678e-05
## rNMF                          3.425224e-05
## roccv                         3.424699e-05
## GRCdata                       3.424601e-05
## RCA                           3.424374e-05
## RedditExtractoR               3.424296e-05
## factualR                      3.423657e-05
## GuardianR                     3.423657e-05
## rbiouml                       3.423657e-05
## rbitcoinchartsapi             3.423657e-05
## restimizeapi                  3.423657e-05
## revgeo                        3.423657e-05
## RNaviCell                     3.423657e-05
## ropensecretsapi               3.423657e-05
## SynergizeR                    3.423657e-05
## Thinknum                      3.423657e-05
## LSDinterface                  3.423173e-05
## networkGen                    3.423014e-05
## OData                         3.422729e-05
## assertive.matrices            3.422592e-05
## assertive.models              3.422592e-05
## decoder                       3.421632e-05
## svHttp                        3.421589e-05
## svKomodo                      3.421589e-05
## svSocket                      3.421589e-05
## svWidgets                     3.421589e-05
## ExceedanceTools               3.419751e-05
## xhmmScripts                   3.419492e-05
## nopp                          3.418326e-05
## BaylorEdPsych                 3.418143e-05
## dixon                         3.417772e-05
## mvglmmRank                    3.417107e-05
## TrendInTrend                  3.416702e-05
## triversity                    3.416566e-05
## TestDataImputation            3.415921e-05
## statip                        3.415261e-05
## QTLRel                        3.414802e-05
## miscFuncs                     3.414635e-05
## DAC                           3.413823e-05
## colourvision                  3.413743e-05
## ads                           3.413628e-05
## ShortForm                     3.412833e-05
## glm.predict                   3.412273e-05
## munfold                       3.412160e-05
## MultiRR                       3.411658e-05
## glmnetUtils                   3.411254e-05
## natural                       3.411254e-05
## TANDEM                        3.411254e-05
## mssqlR                        3.411195e-05
## ASSISTant                     3.410460e-05
## CommonTrend                   3.410067e-05
## CopulaRegression              3.409417e-05
## stapler                       3.409203e-05
## MakefileR                     3.408442e-05
## brnn                          3.407987e-05
## NEff                          3.407785e-05
## mgraph                        3.406684e-05
## SARP.compo                    3.406124e-05
## KappaGUI                      3.406056e-05
## FTICRMS                       3.404513e-05
## quad                          3.404242e-05
## pse                           3.404222e-05
## MIPHENO                       3.404217e-05
## ALTopt                        3.403691e-05
## pleio                         3.403256e-05
## REEMtree                      3.402510e-05
## blsAPI                        3.402108e-05
## notifyR                       3.402108e-05
## RAdwords                      3.402108e-05
## rglobi                        3.402108e-05
## RYoudaoTranslate              3.402108e-05
## sotkanet                      3.402108e-05
## source.gist                   3.402108e-05
## tibbrConnector                3.402108e-05
## zendeskR                      3.402108e-05
## adjclust                      3.400808e-05
## missRanger                    3.400751e-05
## coop                          3.400445e-05
## AnnotationBustR               3.400376e-05
## gquad                         3.400376e-05
## PathSelectMP                  3.399825e-05
## hextri                        3.399553e-05
## EpiStats                      3.399528e-05
## ltsbase                       3.398895e-05
## minque                        3.397938e-05
## adaptMCMC                     3.397907e-05
## iDynoR                        3.397325e-05
## plfm                          3.394313e-05
## Thermimage                    3.394194e-05
## complexity                    3.393482e-05
## fuzzywuzzyR                   3.392489e-05
## SubpathwayGMir                3.392198e-05
## isopam                        3.391876e-05
## ragtop                        3.391661e-05
## longpower                     3.391647e-05
## MLID                          3.391647e-05
## bcrm                          3.391571e-05
## texmex                        3.391571e-05
## dvn                           3.391560e-05
## gmapsdistance                 3.391560e-05
## pumilioR                      3.391560e-05
## rHpcc                         3.391560e-05
## Rjpstatdb                     3.391560e-05
## scraEP                        3.391560e-05
## SPARQL                        3.391560e-05
## ukgasapi                      3.391560e-05
## ZillowR                       3.391560e-05
## dgmb                          3.390140e-05
## lordif                        3.388422e-05
## PSW                           3.388279e-05
## uqr                           3.388279e-05
## diskImageR                    3.388085e-05
## cvxbiclustr                   3.387415e-05
## cvxclustr                     3.387415e-05
## sglasso                       3.387415e-05
## spacejam                      3.387415e-05
## TideTables                    3.386906e-05
## MPSEM                         3.386548e-05
## SSRA                          3.385906e-05
## clusterCrit                   3.385813e-05
## DataClean                     3.385644e-05
## dynRB                         3.385000e-05
## cquad                         3.384043e-05
## PRROC                         3.383968e-05
## GAD                           3.383493e-05
## SMNCensReg                    3.382710e-05
## TopKLists                     3.381013e-05
## mycor                         3.380335e-05
## reldist                       3.379653e-05
## npsf                          3.379514e-05
## LDAvis                        3.378816e-05
## GLMMRR                        3.378524e-05
## MaxPro                        3.378364e-05
## InterVA4                      3.378302e-05
## Tariff                        3.378302e-05
## l1kdeconv                     3.377293e-05
## tseriesEntropy                3.376023e-05
## sparseinv                     3.375743e-05
## ARTP2                         3.375201e-05
## spnet                         3.373923e-05
## kexpmv                        3.373795e-05
## epr                           3.373784e-05
## metacom                       3.372856e-05
## NightDay                      3.372509e-05
## pastis                        3.371933e-05
## ANOVAreplication              3.371059e-05
## PairwiseD                     3.370479e-05
## margins                       3.370351e-05
## MNP                           3.370351e-05
## supclust                      3.369061e-05
## parfossil                     3.368839e-05
## SimRVPedigree                 3.368321e-05
## EstCRM                        3.367503e-05
## rfUtilities                   3.367249e-05
## nlrr                          3.366246e-05
## GAabbreviate                  3.364441e-05
## MOLHD                         3.364335e-05
## HDMD                          3.364137e-05
## lrmest                        3.364137e-05
## FLIM                          3.363088e-05
## royston                       3.362965e-05
## boottol                       3.360364e-05
## docker                        3.359988e-05
## RmixmodCombi                  3.359007e-05
## STI                           3.357580e-05
## rcbalance                     3.356780e-05
## nos                           3.356706e-05
## generalhoslem                 3.356128e-05
## LatticeKrig                   3.355280e-05
## slim                          3.355202e-05
## cAIC4                         3.355074e-05
## collectArgs                   3.355049e-05
## hIRT                          3.352316e-05
## orca                          3.351113e-05
## catenary                      3.350806e-05
## robmed                        3.350806e-05
## CAMAN                         3.349722e-05
## kedd                          3.349560e-05
## DDIwR                         3.349116e-05
## factorplot                    3.348604e-05
## fasttime                      3.347852e-05
## proportion                    3.347783e-05
## iCheck                        3.347223e-05
## GSEAlm                        3.347223e-05
## SSrat                         3.346665e-05
## NORRRM                        3.346622e-05
## mockery                       3.345334e-05
## stoRy                         3.345028e-05
## ionr                          3.344512e-05
## CorrMixed                     3.344125e-05
## elect                         3.343480e-05
## FunCluster                    3.343388e-05
## FastKNN                       3.343276e-05
## gRc                           3.340070e-05
## multivariance                 3.339907e-05
## softImpute                    3.339156e-05
## deltaPlotR                    3.339069e-05
## dad                           3.338953e-05
## VHDClassification             3.338953e-05
## SubVis                        3.338038e-05
## gamsel                        3.337033e-05
## pAnalysis                     3.336968e-05
## multilaterals                 3.336315e-05
## CUFF                          3.336224e-05
## MultiSV                       3.336117e-05
## MOEADr                        3.334690e-05
## Polychrome                    3.334554e-05
## ProbForecastGOP               3.333548e-05
## SeerMapper2010East            3.333358e-05
## SeerMapper2010Regs            3.333358e-05
## SeerMapper2010West            3.333358e-05
## SeerMapperEast                3.333358e-05
## SeerMapperRegs                3.333358e-05
## SeerMapperWest                3.333358e-05
## qdapDictionaries              3.331083e-05
## hbsae                         3.330919e-05
## icmm                          3.330773e-05
## glmpathcr                     3.329777e-05
## reactR                        3.329649e-05
## LFDREmpiricalBayes            3.329270e-05
## stam                          3.329182e-05
## TLdating                      3.328161e-05
## forecTheta                    3.328083e-05
## bang                          3.327967e-05
## CellularAutomaton             3.327137e-05
## cgdsr                         3.327137e-05
## MultipleBubbles               3.326254e-05
## ega                           3.326237e-05
## DHS.rates                     3.326012e-05
## antaresProcessing             3.325972e-05
## gap                           3.325453e-05
## msap                          3.325269e-05
## rreg                          3.324022e-05
## osmose                        3.323545e-05
## NeatMap                       3.323317e-05
## secrdesign                    3.323134e-05
## MSwM                          3.321494e-05
## RMThreshold                   3.321065e-05
## childhoodmortality            3.319939e-05
## SortableHTMLTables            3.319296e-05
## LSAmitR                       3.318064e-05
## PepPrep                       3.317469e-05
## FieldSim                      3.317068e-05
## A3                            3.316862e-05
## rsurface                      3.316716e-05
## fImport                       3.316627e-05
## degreenet                     3.315841e-05
## tsne                          3.315320e-05
## enrichR                       3.314359e-05
## geometa                       3.314310e-05
## PKreport                      3.314087e-05
## RedeR                         3.313577e-05
## spatialfil                    3.313094e-05
## toxboot                       3.312999e-05
## showimage                     3.312430e-05
## adfExplorer                   3.312251e-05
## StratifiedRF                  3.311878e-05
## paco                          3.311673e-05
## eqs2lavaan                    3.311586e-05
## tm.plugin.alceste             3.311330e-05
## tm.plugin.mail                3.311330e-05
## crunchy                       3.310673e-05
## tinyProject                   3.310462e-05
## safe                          3.310393e-05
## etable                        3.309595e-05
## pequod                        3.309347e-05
## ggghost                       3.308179e-05
## timeordered                   3.306546e-05
## AGSDest                       3.306045e-05
## rkt                           3.306005e-05
## gProfileR                     3.305908e-05
## univOutl                      3.305301e-05
## ustyc                         3.304980e-05
## DCL                           3.304923e-05
## atsd                          3.304738e-05
## nomine                        3.304738e-05
## RatingScaleReduction          3.304083e-05
## epxToR                        3.303810e-05
## ungeneanno                    3.303810e-05
## WikipediaR                    3.303810e-05
## rdlocrand                     3.303793e-05
## classifly                     3.303319e-05
## gage                          3.301672e-05
## sessioninfo                   3.301374e-05
## writexl                       3.300828e-05
## fullfact                      3.300247e-05
## spider                        3.298927e-05
## mltools                       3.298618e-05
## EstimateGroupNetwork          3.298029e-05
## CoFRA                         3.297731e-05
## base64url                     3.296889e-05
## shinyRGL                      3.293382e-05
## randomizeR                    3.292107e-05
## gettingtothebottom            3.290638e-05
## adnuts                        3.285681e-05
## ImaginR                       3.284324e-05
## jSonarR                       3.283071e-05
## polidata                      3.283071e-05
## ROpenDota                     3.283071e-05
## seeclickfixr                  3.283071e-05
## cocron                        3.282820e-05
## hdf5r                         3.282629e-05
## greybox                       3.282406e-05
## metap                         3.282021e-05
## h2o4gpu                       3.280532e-05
## rFSA                          3.280529e-05
## fpa                           3.279082e-05
## fdaPDE                        3.278497e-05
## desplot                       3.277909e-05
## SCVA                          3.277122e-05
## LEANR                         3.276020e-05
## event                         3.275935e-05
## gnlm                          3.275935e-05
## growth                        3.275935e-05
## repeated                      3.275935e-05
## Dforest                       3.275511e-05
## aqr                           3.275397e-05
## machQA                        3.275351e-05
## RFinanceYJ                    3.274468e-05
## intRvals                      3.274206e-05
## rematch                       3.273503e-05
## mvtboost                      3.273245e-05
## knitrProgressBar              3.272914e-05
## energyr                       3.271335e-05
## rsurfer                       3.271060e-05
## mcglm                         3.270960e-05
## eegkitdata                    3.270485e-05
## jose                          3.270179e-05
## mongolite                     3.270179e-05
## gnumeric                      3.270121e-05
## caschrono                     3.269494e-05
## lavaanPlot                    3.267784e-05
## geo                           3.267314e-05
## fbRanks                       3.267123e-05
## igraphinshiny                 3.267054e-05
## vote                          3.266471e-05
## dmutate                       3.266261e-05
## geoBayes                      3.265631e-05
## findR                         3.263993e-05
## dbConnect                     3.263338e-05
## riskSimul                     3.262842e-05
## easycsv                       3.261545e-05
## blme                          3.261310e-05
## ConvergenceClubs              3.260013e-05
## lpint                         3.258864e-05
## RHawkes                       3.258864e-05
## ids                           3.258835e-05
## unrtf                         3.258167e-05
## smdc                          3.258037e-05
## timetree                      3.257075e-05
## mrbsizeR                      3.256882e-05
## AmpliconDuo                   3.256179e-05
## vipor                         3.254944e-05
## FPDclustering                 3.254459e-05
## spgrass6                      3.253572e-05
## RADanalysis                   3.251075e-05
## ezec                          3.249752e-05
## excursions                    3.248789e-05
## cardioModel                   3.247932e-05
## geomedb                       3.247927e-05
## randomNames                   3.246173e-05
## crimelinkage                  3.245570e-05
## pcaBootPlot                   3.245251e-05
## breakaway                     3.240055e-05
## easyNCDF                      3.239432e-05
## spTest                        3.239190e-05
## IBCF.MTME                     3.238604e-05
## PeakError                     3.237640e-05
## DamiaNN                       3.236413e-05
## acp                           3.235142e-05
## RandPro                       3.234168e-05
## SpatialFloor                  3.233997e-05
## future.callr                  3.233656e-05
## npIntFactRep                  3.232888e-05
## googlePublicData              3.232179e-05
## networkDynamicData            3.231148e-05
## HyPhy                         3.230706e-05
## blockTools                    3.229695e-05
## leabRa                        3.228658e-05
## auto.pca                      3.226685e-05
## ABCoptim                      3.224799e-05
## accelerometry                 3.224799e-05
## AnaCoDa                       3.224799e-05
## BalancedSampling              3.224799e-05
## batman                        3.224799e-05
## BeviMed                       3.224799e-05
## bsearchtools                  3.224799e-05
## bsplinePsd                    3.224799e-05
## bWGR                          3.224799e-05
## CDF.PSIdekick                 3.224799e-05
## cgAUC                         3.224799e-05
## chopthin                      3.224799e-05
## chunkR                        3.224799e-05
## cld2                          3.224799e-05
## cld3                          3.224799e-05
## ClinicalTrialSummary          3.224799e-05
## clogitboost                   3.224799e-05
## clogitL1                      3.224799e-05
## ClustMMDD                     3.224799e-05
## ClustVarLV                    3.224799e-05
## CMF                           3.224799e-05
## cna                           3.224799e-05
## CompGLM                       3.224799e-05
## ConConPiWiFun                 3.224799e-05
## curstatCI                     3.224799e-05
## DataGraph                     3.224799e-05
## deepboost                     3.224799e-05
## dlib                          3.224799e-05
## dng                           3.224799e-05
## eive                          3.224799e-05
## essHist                       3.224799e-05
## EWGoF                         3.224799e-05
## exif                          3.224799e-05
## fasteraster                   3.224799e-05
## fastJT                        3.224799e-05
## fastTextR                     3.224799e-05
## ffstream                      3.224799e-05
## flock                         3.224799e-05
## forecastSNSTS                 3.224799e-05
## forestControl                 3.224799e-05
## fromo                         3.224799e-05
## fs                            3.224799e-05
## fst                           3.224799e-05
## fwsim                         3.224799e-05
## genepop                       3.224799e-05
## genie                         3.224799e-05
## geohash                       3.224799e-05
## geoops                        3.224799e-05
## glm.deploy                    3.224799e-05
## GUTS                          3.224799e-05
## h5                            3.224799e-05
## HHG                           3.224799e-05
## hommel                        3.224799e-05
## htdp                          3.224799e-05
## humaniformat                  3.224799e-05
## ibm                           3.224799e-05
## ibmcraftr                     3.224799e-05
## IsoSpecR                      3.224799e-05
## jtGWAS                        3.224799e-05
## junctions                     3.224799e-05
## knor                          3.224799e-05
## KoulMde                       3.224799e-05
## kvh                           3.224799e-05
## libstableR                    3.224799e-05
## lm.br                         3.224799e-05
## NetSim                        3.224799e-05
## NPBayesImpute                 3.224799e-05
## Numero                        3.224799e-05
## olctools                      3.224799e-05
## OneArmPhaseTwoStudy           3.224799e-05
## packcircles                   3.224799e-05
## penMSM                        3.224799e-05
## Peptides                      3.224799e-05
## PerMallows                    3.224799e-05
## ph2bayes                      3.224799e-05
## Pijavski                      3.224799e-05
## poisbinom                     3.224799e-05
## poisDoubleSamp                3.224799e-05
## polyfreqs                     3.224799e-05
## PP                            3.224799e-05
## prclust                       3.224799e-05
## primes                        3.224799e-05
## protViz                       3.224799e-05
## pvar                          3.224799e-05
## RcppAlgos                     3.224799e-05
## RcppAPT                       3.224799e-05
## RcppCNPy                      3.224799e-05
## RcppCWB                       3.224799e-05
## RcppDL                        3.224799e-05
## RcppExamples                  3.224799e-05
## RcppGetconf                   3.224799e-05
## RcppHoney                     3.224799e-05
## readobj                       3.224799e-05
## recurse                       3.224799e-05
## repfdr                        3.224799e-05
## rforensicbatwing              3.224799e-05
## RInside                       3.224799e-05
## Rip46                         3.224799e-05
## rivr                          3.224799e-05
## rkvo                          3.224799e-05
## rmumps                        3.224799e-05
## rococo                        3.224799e-05
## RoughSets                     3.224799e-05
## rtk                           3.224799e-05
## rucrdtw                       3.224799e-05
## Rvoterdistance                3.224799e-05
## RVowpalWabbit                 3.224799e-05
## rwfec                         3.224799e-05
## s2                            3.224799e-05
## scorer                        3.224799e-05
## securitytxt                   3.224799e-05
## sequences                     3.224799e-05
## SNPknock                      3.224799e-05
## SobolSequence                 3.224799e-05
## social                        3.224799e-05
## SOD                           3.224799e-05
## specklestar                   3.224799e-05
## STARTdesign                   3.224799e-05
## stdvectors                    3.224799e-05
## StepSignalMargiLike           3.224799e-05
## TFMPvalue                     3.224799e-05
## tvd                           3.224799e-05
## UniDOE                        3.224799e-05
## UniIsoRegression              3.224799e-05
## validatejsonr                 3.224799e-05
## VeryLargeIntegers             3.224799e-05
## VNM                           3.224799e-05
## waffect                       3.224799e-05
## wingui                        3.224799e-05
## wsrf                          3.224799e-05
## xyz                           3.224799e-05
## YPInterimTesting              3.224799e-05
## zstdr                         3.224799e-05
## odkr                          3.223762e-05
## fractaldim                    3.222591e-05
## POET                          3.220766e-05
## zlibbioc                      3.220023e-05
## census                        3.219676e-05
## worms                         3.218158e-05
## subscreen                     3.217750e-05
## CANSIM2R                      3.217449e-05
## beanplot                      3.215774e-05
## ggjoy                         3.215769e-05
## PDSCE                         3.215187e-05
## cmm                           3.212155e-05
## PhySortR                      3.212009e-05
## rmcorr                        3.210877e-05
## msaR                          3.210701e-05
## asVPC                         3.209769e-05
## DoTC                          3.209769e-05
## ggFacetSample                 3.209769e-05
## statcheck                     3.209769e-05
## itan                          3.209118e-05
## Methplot                      3.209118e-05
## DisimForMixed                 3.209011e-05
## funrar                        3.209011e-05
## ggpval                        3.208192e-05
## openEBGM                      3.208192e-05
## tictoc                        3.206915e-05
## SMR                           3.206425e-05
## wheatmap                      3.205200e-05
## RGreenplum                    3.204777e-05
## mmppr                         3.199967e-05
## jaatha                        3.199422e-05
## easypackages                  3.198810e-05
## ZRA                           3.198012e-05
## spc4sts                       3.195990e-05
## cablecuttr                    3.195322e-05
## censusapi                     3.195322e-05
## coindeskr                     3.195322e-05
## ddeploy                       3.195322e-05
## elasticsearchr                3.195322e-05
## fedreporter                   3.195322e-05
## GAR                           3.195322e-05
## gym                           3.195322e-05
## junr                          3.195322e-05
## patentsview                   3.195322e-05
## rapiclient                    3.195322e-05
## RDota2                        3.195322e-05
## Rga4gh                        3.195322e-05
## rhymer                        3.195322e-05
## ROpenFIGI                     3.195322e-05
## ROptimizely                   3.195322e-05
## rosetteApi                    3.195322e-05
## rstatscn                      3.195322e-05
## RZabbix                       3.195322e-05
## SigOptR                       3.195322e-05
## TCIApathfinder                3.195322e-05
## ThankYouStars                 3.195322e-05
## TMDb                          3.195322e-05
## tubern                        3.195322e-05
## twfy                          3.195322e-05
## yummlyr                       3.195322e-05
## bindr                         3.195272e-05
## IBrokers                      3.195124e-05
## neverhpfilter                 3.195124e-05
## Strategy                      3.195124e-05
## LowRankQP                     3.194203e-05
## pps                           3.194175e-05
## lvplot                        3.193962e-05
## ALL                           3.193783e-05
## pushoverr                     3.188922e-05
## ykmeans                       3.188801e-05
## pivotaltrackR                 3.187785e-05
## rdian                         3.187785e-05
## AlphaVantageClient            3.187647e-05
## xltabr                        3.187188e-05
## OriGen                        3.186918e-05
## phyloclim                     3.186752e-05
## blandr                        3.186448e-05
## DescToolsAddIns               3.186151e-05
## pan                           3.184861e-05
## rsimsum                       3.180943e-05
## profr                         3.179904e-05
## searchConsoleR                3.179837e-05
## dropR                         3.179835e-05
## FuzzyR                        3.179835e-05
## pkgcopier                     3.178734e-05
## ratios                        3.178326e-05
## RSAP                          3.177752e-05
## scientoText                   3.176874e-05
## pdfsearch                     3.176332e-05
## popprxl                       3.176230e-05
## liquidSVM                     3.174788e-05
## wordmatch                     3.173591e-05
## mvcwt                         3.172994e-05
## krm                           3.170665e-05
## robustrank                    3.170665e-05
## GAparsimony                   3.170530e-05
## bde                           3.170277e-05
## sglr                          3.170277e-05
## rnaturalearthdata             3.169172e-05
## RDAVIDWebService              3.169087e-05
## rjstat                        3.167665e-05
## captr                         3.166118e-05
## clarifai                      3.166118e-05
## GoogleKnowledgeGraphR         3.166118e-05
## sdmvspecies                   3.164341e-05
## ABHgenotypeR                  3.164033e-05
## BCellMA                       3.164033e-05
## BinarybalancedCut             3.164033e-05
## bmmix                         3.164033e-05
## cutoffR                       3.164033e-05
## exreport                      3.164033e-05
## fcm                           3.164033e-05
## gapmap                        3.164033e-05
## mhtboot                       3.164033e-05
## PlotPrjNetworks               3.164033e-05
## tvm                           3.164033e-05
## xsp                           3.164033e-05
## lmeNBBayes                    3.163471e-05
## qrcode                        3.161514e-05
## shinyalert                    3.159621e-05
## shinyFeedback                 3.159621e-05
## radir                         3.159383e-05
## oxcAAR                        3.157067e-05
## muRL                          3.157052e-05
## ECharts2Shiny                 3.156999e-05
## patchSynctex                  3.156582e-05
## ucbthesis                     3.156582e-05
## covafillr                     3.155391e-05
## methylumi                     3.154872e-05
## missMethyl                    3.154872e-05
## fail                          3.153911e-05
## rpn                           3.153911e-05
## colt                          3.152664e-05
## linl                          3.152337e-05
## pinp                          3.152337e-05
## rchallenge                    3.152337e-05
## tufterhandout                 3.152337e-05
## roahd                         3.151565e-05
## managelocalrepo               3.150668e-05
## ISwR                          3.149965e-05
## MaxentVariableSelection       3.147426e-05
## envirem                       3.144776e-05
## parallelML                    3.143864e-05
## ramsvm                        3.143864e-05
## reval                         3.143864e-05
## Rlof                          3.143864e-05
## ClustGeo                      3.143747e-05
## MetaboList                    3.143131e-05
## profvis                       3.141509e-05
## pairsD3                       3.141440e-05
## rpivotTable                   3.141440e-05
## RRedshiftSQL                  3.141156e-05
## MCMC4Extremes                 3.140061e-05
## exsic                         3.139342e-05
## sparkwarc                     3.139239e-05
## HyperbolicDist                3.138430e-05
## supervisedPRIM                3.137839e-05
## UNF                           3.136629e-05
## RANN.L1                       3.136251e-05
## supportInt                    3.135928e-05
## versions                      3.134242e-05
## bibliospec                    3.133514e-05
## D3GB                          3.133514e-05
## ggsignif                      3.131836e-05
## rehh.data                     3.130547e-05
## fecR                          3.130492e-05
## adklakedata                   3.129655e-05
## RGoogleAnalytics              3.129322e-05
## Rnumerai                      3.129322e-05
## tsModel                       3.128096e-05
## internetarchive               3.127639e-05
## nitrcbot                      3.127639e-05
## WHO                           3.127639e-05
## lookupTable                   3.127231e-05
## camsRad                       3.124692e-05
## edgarWebR                     3.124692e-05
## glassdoor                     3.124692e-05
## prettydoc                     3.123410e-05
## matpow                        3.120874e-05
## EmpiricalCalibration          3.120690e-05
## metaplotr                     3.120690e-05
## AnglerCreelSurveySimulation   3.119250e-05
## ggquiver                      3.119250e-05
## LocFDRPois                    3.119250e-05
## mnreadR                       3.119250e-05
## plotrr                        3.119250e-05
## RArcInfo                      3.116883e-05
## bpa                           3.116701e-05
## CharFun                       3.115915e-05
## ncdump                        3.115552e-05
## duckduckr                     3.114653e-05
## arfima                        3.113684e-05
## tscount                       3.113684e-05
## makeFlow                      3.113001e-05
## dfped                         3.112844e-05
## edstan                        3.112844e-05
## qqvases                       3.110807e-05
## ecotox                        3.107143e-05
## loggit                        3.105972e-05
## likelihoodExplore             3.105732e-05
## gghalfnorm                    3.105681e-05
## gMOIP                         3.105681e-05
## graticule                     3.105577e-05
## prioritizrdata                3.105577e-05
## sdm                           3.105577e-05
## usdm                          3.105577e-05
## rmdHelpers                    3.105487e-05
## ParDNAcopy                    3.105037e-05
## graphon                       3.104729e-05
## lagged                        3.104218e-05
## portes                        3.104218e-05
## boxoffice                     3.101836e-05
## bdscale                       3.099891e-05
## ggallin                       3.099891e-05
## ggChernoff                    3.099891e-05
## gofMC                         3.099891e-05
## jcolors                       3.099891e-05
## precintcon                    3.099891e-05
## rcartocolor                   3.099891e-05
## hmeasure                      3.098815e-05
## downsize                      3.098311e-05
## exactRankTests                3.098083e-05
## sss                           3.096625e-05
## SSBtools                      3.095564e-05
## OAIHarvester                  3.095488e-05
## rversions                     3.095488e-05
## W3CMarkupValidator            3.095488e-05
## mpt                           3.091461e-05
## magicLamp                     3.091073e-05
## fastDummies                   3.090665e-05
## CMPControl                    3.090130e-05
## MatrixEQTL                    3.087127e-05
## tilegramsR                    3.086506e-05
## midas                         3.086369e-05
## vistime                       3.083850e-05
## OrdLogReg                     3.083650e-05
## denovolyzeR                   3.083072e-05
## laketemps                     3.083072e-05
## babynames                     3.082581e-05
## divagis                       3.081468e-05
## landsat8                      3.081468e-05
## rcanvec                       3.081468e-05
## riverdist                     3.081468e-05
## aniDom                        3.080360e-05
## MRCV                          3.078684e-05
## d3plus                        3.078306e-05
## datamaps                      3.078306e-05
## rccdates                      3.078223e-05
## wrswoR.benchmark              3.075359e-05
## paintmap                      3.074465e-05
## WeightIt                      3.074070e-05
## petrinetR                     3.065866e-05
## sparkline                     3.065355e-05
## shinyDND                      3.064257e-05
## cartogram                     3.059262e-05
## BayesianAnimalTracker         3.057443e-05
## regexSelect                   3.055063e-05
## extfunnel                     3.053195e-05
## predatory                     3.051751e-05
## shinycustomloader             3.048046e-05
## xlutils3                      3.043900e-05
## kriging                       3.042840e-05
## oz                            3.042840e-05
## survJamda.data                3.040654e-05
## countytimezones               3.039972e-05
## states                        3.039972e-05
## bigGP                         3.038383e-05
## rnr                           3.037342e-05
## lomb                          3.034815e-05
## deducorrect                   3.032686e-05
## plotwidgets                   3.029649e-05
## Oarray                        3.029367e-05
## formulize                     3.028392e-05
## cymruservices                 3.027154e-05
## AmesHousing                   3.026182e-05
## homologene                    3.026182e-05
## rollmatch                     3.026182e-05
## taber                         3.026182e-05
## wfindr                        3.026182e-05
## GSEABase                      3.025424e-05
## optigrab                      3.025056e-05
## searchable                    3.025056e-05
## wildcard                      3.025056e-05
## rsed                          3.024026e-05
## descomponer                   3.023728e-05
## spanish                       3.023235e-05
## costat                        3.023194e-05
## MeanShift                     3.023194e-05
## waveband                      3.023194e-05
## rredis                        3.022586e-05
## BSgenome.Hsapiens.UCSC.hg19   3.019733e-05
## vsn                           3.018024e-05
## rprintf                       3.014914e-05
## geneplotter                   3.014755e-05
## exams                         3.014749e-05
## BMRBr                         3.009539e-05
## Modelcharts                   3.009138e-05
## bmotif                        3.005840e-05
## PTAk                          3.005840e-05
## SOUP                          3.005840e-05
## tensorBF                      3.005840e-05
## lmf                           3.003859e-05
## gibble                        3.001723e-05
## plspm.formula                 2.998705e-05
## EnvNicheR                     2.998095e-05
## softermax                     2.997708e-05
## rlo                           2.984031e-05
## NonpModelCheck                2.982975e-05
## in2extRemes                   2.977262e-05
## auctestr                      2.976832e-05
## ezsummary                     2.976832e-05
## splithalf                     2.976832e-05
## Ckmeans.1d.dp                 2.975650e-05
## BOIN                          2.973223e-05
## ORCME                         2.973223e-05
## listless                      2.964724e-05
## monreg                        2.964645e-05
## zfa                           2.960702e-05
## modelObj                      2.960464e-05
## linkR                         2.959485e-05
## na.tools                      2.957674e-05
## argon2                        2.957187e-05
## tailr                         2.955335e-05
## valaddin                      2.952982e-05
## FuzzyMCDM                     2.952676e-05
## MCDM                          2.952676e-05
## CCP                           2.951709e-05
## birk                          2.944460e-05
## CytobankAPIstats              2.938573e-05
## CytobankBridgeR               2.938573e-05
## cattonum                      2.938339e-05
## GenABEL.data                  2.937451e-05
## DiffBind                      2.934271e-05
## allelematch                   2.930554e-05
## comparison                    2.926495e-05
## twostageTE                    2.926495e-05
## ztable                        2.922909e-05
## clpAPI                        2.922875e-05
## EQUIVNONINF                   2.920737e-05
## MIDN                          2.920737e-05
## ARTP                          2.919894e-05
## GlobalFit                     2.919600e-05
## sybilDynFBA                   2.919600e-05
## riceware                      2.915588e-05
## relatable                     2.914758e-05
## TunePareto                    2.911845e-05
## pweight                       2.905253e-05
## PCAmixdata                    2.902656e-05
## AUtests                       2.897741e-05
## EHR                           2.897741e-05
## mbmdr                         2.897741e-05
## ars                           2.895577e-05
## SAM                           2.893918e-05
## adwave                        2.893807e-05
## brainwaver                    2.893807e-05
## wmlf                          2.893807e-05
## MMDai                         2.891151e-05
## PBSadmb                       2.890495e-05
## grpSLOPE                      2.885689e-05
## GSVA                          2.883637e-05
## RWiener                       2.883379e-05
## yacca                         2.879239e-05
## eMLEloglin                    2.878776e-05
## MultiplierDEA                 2.878776e-05
## safeBinaryRegression          2.878776e-05
## TFDEA                         2.878776e-05
## sfa                           2.876358e-05
## lfactors                      2.870012e-05
## NAEPprimer                    2.870012e-05
## HiddenMarkov                  2.869400e-05
## cpm                           2.867859e-05
## dosresmeta                    2.865867e-05
## INSPIRE                       2.864194e-05
## kazaam                        2.857588e-05
## pbdPROF                       2.857588e-05
## FusedPCA                      2.854685e-05
## nipals                        2.854475e-05
## CaDENCE                       2.854133e-05
## symDMatrix                    2.853463e-05
## lisp                          2.853448e-05
## GlobalAncova                  2.850515e-05
## gbutils                       2.849723e-05
## wikibooks                     2.841856e-05
## rbounds                       2.841549e-05
## SAMUR                         2.841549e-05
## cnbdistr                      2.840896e-05
## Compounding                   2.840896e-05
## contfrac                      2.840896e-05
## fitODBOD                      2.840896e-05
## PeakSegOptimal                2.836828e-05
## operators                     2.835877e-05
## SWATmodel                     2.835877e-05
## BioSeqClass                   2.830689e-05
## aylmer                        2.826548e-05
## uGMAR                         2.826548e-05
## patchPlot                     2.826423e-05
## DSL                           2.825304e-05
## astroFns                      2.822373e-05
## rzmq                          2.821438e-05
## iBBiG                         2.818302e-05
## rqubic                        2.818302e-05
## BicARE                        2.818302e-05
## bmixture                      2.816828e-05
## adaptivetau                   2.816782e-05
## tsintermittent                2.815460e-05
## PoiClaClu                     2.815298e-05
## ssize.fdr                     2.814606e-05
## MPDiR                         2.813100e-05
## FACTMLE                       2.812980e-05
## FastKM                        2.812980e-05
## PPCI                          2.812980e-05
## glmc                          2.812770e-05
## SAScii                        2.808936e-05
## utiml                         2.807097e-05
## blocksdesign                  2.804873e-05
## intrinsicDimension            2.804809e-05
## metasens                      2.800774e-05
## noise                         2.798708e-05
## latexpdf                      2.798555e-05
## randomizr                     2.797806e-05
## disclap                       2.797664e-05
## jiebaRD                       2.797382e-05
## sitreeE                       2.797234e-05
## binseqtest                    2.791453e-05
## ph2mult                       2.791453e-05
## DEEPR                         2.791036e-05
## tuple                         2.787343e-05
## PreProcess                    2.787094e-05
## dlmodeler                     2.785245e-05
## rucm                          2.785245e-05
## tsPI                          2.785245e-05
## babel                         2.784897e-05
## RobRex                        2.783352e-05
## woeBinning                    2.782073e-05
## rbamtools                     2.777499e-05
## lqa                           2.777403e-05
## recommenderlabBX              2.773564e-05
## recommenderlabJester          2.773564e-05
## riverplot                     2.772764e-05
## orthogonalsplinebasis         2.771472e-05
## R2SWF                         2.763968e-05
## pstest                        2.762286e-05
## gputools                      2.762066e-05
## MSeasyTkGUI                   2.760548e-05
## randtests                     2.758448e-05
## flowWorkspace                 2.758392e-05
## WilcoxCV                      2.755712e-05
## Rbent                         2.754072e-05
## Rwave                         2.754013e-05
## bvls                          2.752639e-05
## invgamma                      2.752300e-05
## Nozzle.R1                     2.751858e-05
## RSSampling                    2.750583e-05
## pdmod                         2.750561e-05
## AncestryMapper                2.750238e-05
## poilog                        2.749374e-05
## DetSel                        2.744226e-05
## dSVA                          2.743981e-05
## ProfessR                      2.742446e-05
## quarrint                      2.739418e-05
## LRcontrast                    2.737188e-05
## Rramas                        2.737122e-05
## gsscopu                       2.736744e-05
## affxparser                    2.732527e-05
## Distance                      2.731143e-05
## mads                          2.731143e-05
## Exact                         2.730229e-05
## NISTunits                     2.729288e-05
## longmemo                      2.728315e-05
## dashboard                     2.725626e-05
## pdInfoBuilder                 2.724551e-05
## convert                       2.724551e-05
## annotate                      2.724551e-05
## simpleaffy                    2.724551e-05
## lumi                          2.724551e-05
## ssize                         2.724551e-05
## Category                      2.724551e-05
## WMWssp                        2.723550e-05
## BonEV                         2.722890e-05
## NBPSeq                        2.722890e-05
## PsiHat                        2.722890e-05
## readBrukerFlexData            2.722709e-05
## eqtl                          2.722344e-05
## MPR.genotyping                2.722344e-05
## qtlbook                       2.722344e-05
## xoi                           2.722344e-05
## rvgtest                       2.720345e-05
## lcda                          2.720070e-05
## tableplot                     2.718043e-05
## cxxfunplus                    2.717531e-05
## swapClass                     2.717531e-05
## WWR                           2.717531e-05
## highD2pop                     2.715606e-05
## Sky                           2.713512e-05
## jackknifeKME                  2.713260e-05
## musicNMR                      2.713151e-05
## GRTo                          2.705467e-05
## tsdf                          2.701040e-05
## PottsUtils                    2.699091e-05
## ROI.models.netlib             2.695183e-05
## migration.indices             2.694981e-05
## phenability                   2.694981e-05
## binomSamSize                  2.694821e-05
## nnetpredint                   2.694483e-05
## Inflation                     2.693976e-05
## ensurer                       2.692118e-05
## gdsfmt                        2.690327e-05
## SimuChemPC                    2.689404e-05
## LPTime                        2.689393e-05
## uniftest                      2.689393e-05
## AssocAFC                      2.680981e-05
## MiST                          2.680981e-05
## MVLM                          2.680981e-05
## rvTDT                         2.680981e-05
## tourr                         2.680310e-05
## BiocParallel                  2.679787e-05
## fuzzyRankTests                2.673119e-05
## affyPLM                       2.673119e-05
## svmpath                       2.671266e-05
## photobiologyFilters           2.670142e-05
## photobiologyLamps             2.670142e-05
## photobiologyLEDs              2.670142e-05
## photobiologySensors           2.670142e-05
## photobiologySun               2.670142e-05
## easypower                     2.668137e-05
## OptSig                        2.668137e-05
## protoclust                    2.666240e-05
## MBCluster.Seq                 2.663471e-05
## causalMGM                     2.661125e-05
## deisotoper                    2.661125e-05
## extraTrees                    2.661125e-05
## GreedyExperimentalDesign      2.661125e-05
## helixvis                      2.661125e-05
## helloJavaWorld                2.661125e-05
## ramidst                       2.661125e-05
## RFreak                        2.661125e-05
## rGroovy                       2.661125e-05
## RMongo                        2.661125e-05
## rMouse                        2.661125e-05
## RNCBIEUtilsLibs               2.661125e-05
## SBRect                        2.661125e-05
## sjdbc                         2.661125e-05
## SqlRender                     2.661125e-05
## wordnet                       2.661125e-05
## CausalGAM                     2.660590e-05
## ProDenICA                     2.660590e-05
## ktspair                       2.657912e-05
## MM2Sdata                      2.657912e-05
## propOverlap                   2.657912e-05
## deltar                        2.657027e-05
## GABi                          2.654402e-05
## rpartitions                   2.654402e-05
## tictactoe                     2.654402e-05
## smatr                         2.654174e-05
## smoothie                      2.654174e-05
## FrF2.catlg128                 2.653726e-05
## digitize                      2.651574e-05
## wgsea                         2.651351e-05
## GenWin                        2.650309e-05
## phtt                          2.650309e-05
## DiscreteInverseWeibull        2.650053e-05
## GofKmt                        2.650053e-05
## guess                         2.650053e-05
## QFASA                         2.650053e-05
## qfasar                        2.650053e-05
## Renvlp                        2.650053e-05
## choiceDes                     2.649295e-05
## sonify                        2.647181e-05
## BLR                           2.646029e-05
## aml                           2.644010e-05
## cumSeg                        2.644010e-05
## lassopv                       2.644010e-05
## relaxo                        2.644010e-05
## RXshrink                      2.644010e-05
## sealasso                      2.644010e-05
## sisVIVE                       2.644010e-05
## RcmdrPlugin.aRnova            2.643706e-05
## RcmdrPlugin.EZR               2.643706e-05
## RcmdrPlugin.IPSUR             2.643706e-05
## RcmdrPlugin.qual              2.643706e-05
## REST                          2.643706e-05
## FRACTION                      2.643522e-05
## preseqR                       2.641653e-05
## rationalfun                   2.641653e-05
## diffpriv                      2.638821e-05
## palinsol                      2.638821e-05
## rGammaGamma                   2.638821e-05
## tggd                          2.638821e-05
## CMA                           2.637957e-05
## laGP                          2.637514e-05
## subsemble                     2.636861e-05
## skewt                         2.636245e-05
## benchmarkmeData               2.635003e-05
## CreditRisk                    2.630282e-05
## ocedata                       2.630085e-05
## binGroup                      2.628058e-05
## ConSpline                     2.626875e-05
## splines2                      2.625709e-05
## spatialCovariance             2.625447e-05
## MortCast                      2.624416e-05
## RFormatter                    2.623159e-05
## kmndirs                       2.622803e-05
## rportfolios                   2.621757e-05
## abc.data                      2.621532e-05
## MissMech                      2.620011e-05
## EpistemicGameTheory           2.618253e-05
## goalprog                      2.618253e-05
## KnapsackSampling              2.618253e-05
## mpcv                          2.618253e-05
## OGI                           2.618253e-05
## QCApro                        2.618253e-05
## imputePSF                     2.616580e-05
## allan                         2.615617e-05
## LCFdata                       2.615058e-05
## HaploSim                      2.614504e-05
## table1xls                     2.613819e-05
## UWHAM                         2.612421e-05
## Rdisop                        2.612217e-05
## seas                          2.611129e-05
## crrstep                       2.607079e-05
## crskdiag                      2.607079e-05
## decon                         2.604974e-05
## topGO                         2.604886e-05
## RODBCext                      2.602322e-05
## RODM                          2.602322e-05
## SQRL                          2.602322e-05
## GEEmediate                    2.601511e-05
## mmm                           2.601511e-05
## mmm2                          2.601511e-05
## weightr                       2.598551e-05
## erpR                          2.598167e-05
## iotools                       2.597281e-05
## liqueueR                      2.596743e-05
## Sejong                        2.596146e-05
## SEchart                       2.596143e-05
## splitfngr                     2.594243e-05
## DAAGbio                       2.593288e-05
## EntropyEstimation             2.589496e-05
## metagenomeSeq                 2.587467e-05
## VariantAnnotation             2.587257e-05
## Binarize                      2.586891e-05
## BiTrinA                       2.586891e-05
## fisheyeR                      2.585244e-05
## idendr0                       2.585244e-05
## MareyMap                      2.585244e-05
## OligoSpecificitySystem        2.585244e-05
## SyNet                         2.585244e-05
## gcrma                         2.583653e-05
## MEIGOR                        2.583263e-05
## robcor                        2.582533e-05
## DiagrammeRsvg                 2.580733e-05
## DOT                           2.580733e-05
## js                            2.580733e-05
## lutz                          2.580733e-05
## minimist                      2.580733e-05
## rjade                         2.580733e-05
## suncalc                       2.580733e-05
## APtools                       2.580718e-05
## BayesMixSurv                  2.580718e-05
## BGPhazard                     2.580718e-05
## cchs                          2.580718e-05
## censCov                       2.580718e-05
## CIEE                          2.580718e-05
## concreg                       2.580718e-05
## controlTest                   2.580718e-05
## coxphf                        2.580718e-05
## CoxPhLb                       2.580718e-05
## coxphSGD                      2.580718e-05
## coxphw                        2.580718e-05
## CoxRidge                      2.580718e-05
## coxrobust                     2.580718e-05
## CP                            2.580718e-05
## crrSC                         2.580718e-05
## dynpred                       2.580718e-05
## EL2Surv                       2.580718e-05
## ELYP                          2.580718e-05
## flexPM                        2.580718e-05
## fmrs                          2.580718e-05
## glrt                          2.580718e-05
## goftte                        2.580718e-05
## gte                           2.580718e-05
## gtx                           2.580718e-05
## HapEstXXR                     2.580718e-05
## InferenceSMR                  2.580718e-05
## IPWsurvival                   2.580718e-05
## kin.cohort                    2.580718e-05
## kmconfband                    2.580718e-05
## landest                       2.580718e-05
## linERR                        2.580718e-05
## longROC                       2.580718e-05
## mpr                           2.580718e-05
## NNMIS                         2.580718e-05
## nricens                       2.580718e-05
## numKM                         2.580718e-05
## paf                           2.580718e-05
## PAmeasures                    2.580718e-05
## partDSA                       2.580718e-05
## PHeval                        2.580718e-05
## plRasch                       2.580718e-05
## powerSurvEpi                  2.580718e-05
## prognosticROC                 2.580718e-05
## pseval                        2.580718e-05
## PWEALL                        2.580718e-05
## PwrGSD                        2.580718e-05
## rankhazard                    2.580718e-05
## rolr                          2.580718e-05
## Rsurrogate                    2.580718e-05
## sensitivityPStrat             2.580718e-05
## SimHaz                        2.580718e-05
## smoothHR                      2.580718e-05
## STAND                         2.580718e-05
## Sunclarco                     2.580718e-05
## SurrogateTest                 2.580718e-05
## survAWKMT2                    2.580718e-05
## survexp.fr                    2.580718e-05
## Survgini                      2.580718e-05
## tccox                         2.580718e-05
## tdROC                         2.580718e-05
## TimeVTree                     2.580718e-05
## TwoPhaseInd                   2.580718e-05
## TwoStepCLogit                 2.580718e-05
## uniCox                        2.580718e-05
## valorate                      2.580718e-05
## mdftracks                     2.580461e-05
## seqLogo                       2.578460e-05
## hetmeta                       2.578220e-05
## MCPerm                        2.578220e-05
## Replicate                     2.578220e-05
## SAMURAI                       2.578220e-05
## dvfBm                         2.578044e-05
## MetaCycle                     2.577536e-05
## llogistic                     2.577170e-05
## trapezoid                     2.577170e-05
## iemiscdata                    2.576796e-05
## NORMA                         2.575998e-05
## prop.comb.RR                  2.575998e-05
## subprocess                    2.574500e-05
## wrspathrowData                2.572786e-05
## DNetFinder                    2.571686e-05
## Agreement                     2.571306e-05
## HTMLUtils                     2.571306e-05
## hamlet                        2.570557e-05
## someMTP                       2.568424e-05
## LCA                           2.568328e-05
## snp.plotter                   2.566757e-05
## binda                         2.566608e-05
## msu                           2.566608e-05
## betas                         2.565378e-05
## qqtest                        2.565378e-05
## MC2toPath                     2.565131e-05
## EDR                           2.564991e-05
## fpca                          2.564991e-05
## biglars                       2.562948e-05
## bootSVD                       2.562948e-05
## PopGenome                     2.562948e-05
## DEMOVA                        2.562332e-05
## Kpart                         2.562332e-05
## DBGSA                         2.560780e-05
## SimSeq                        2.560780e-05
## DSBayes                       2.559778e-05
## condmixt                      2.558858e-05
## evt0                          2.558858e-05
## SimCorMultRes                 2.558858e-05
## miniGUI                       2.558319e-05
## rda                           2.557850e-05
## ridge                         2.557850e-05
## indicspecies                  2.557587e-05
## crossval                      2.553693e-05
## selectMeta                    2.553101e-05
## mmeta                         2.552540e-05
## ghit                          2.551806e-05
## prettyR                       2.550731e-05
## rngWELL                       2.549160e-05
## TruncatedNormal               2.549160e-05
## GESE                          2.547342e-05
## RVsharing                     2.547342e-05
## lifecourse                    2.547159e-05
## NLRoot                        2.547026e-05
## BaSTA                         2.545508e-05
## GlobalDeviance                2.545508e-05
## NUCOMBog                      2.545508e-05
## widals                        2.545508e-05
## naivebayes                    2.544429e-05
## zeallot                       2.544311e-05
## desiR                         2.544235e-05
## install.load                  2.544199e-05
## pwt                           2.541652e-05
## MittagLeffleR                 2.540818e-05
## RViennaCL                     2.540543e-05
## clipper                       2.538472e-05
## RRF                           2.538359e-05
## Libra                         2.537047e-05
## titanic                       2.536439e-05
## confreq                       2.535727e-05
## rknn                          2.535727e-05
## Zseq                          2.535727e-05
## CircMLE                       2.532381e-05
## wle                           2.532381e-05
## censusGeography               2.532184e-05
## apng                          2.531473e-05
## cdb                           2.531473e-05
## geozoo                        2.531473e-05
## IgorR                         2.531473e-05
## LiblineaR                     2.530110e-05
## hgm                           2.530035e-05
## microPop                      2.530035e-05
## neuRosim                      2.530035e-05
## phaseR                        2.530035e-05
## streambugs                    2.530035e-05
## TDCor                         2.530035e-05
## gvlma                         2.528983e-05
## LindleyR                      2.528188e-05
## PortfolioOptim                2.527716e-05
## OSCV                          2.527040e-05
## biosignalEMG                  2.526415e-05
## gem                           2.526415e-05
## gemlog                        2.526415e-05
## Rivivc                        2.526415e-05
## lbiassurv                     2.525900e-05
## EnsembleCV                    2.525604e-05
## EnsemblePCReg                 2.525604e-05
## DTK                           2.525574e-05
## NMOF                          2.524914e-05
## tabuSearch                    2.524914e-05
## ipwErrorY                     2.523908e-05
## SPmlficmcm                    2.523908e-05
## SPPcomb                       2.523908e-05
## ISDA.R                        2.523016e-05
## MagneticMap                   2.523016e-05
## matrixLaplacian               2.523016e-05
## PharmPow                      2.523016e-05
## BayClone2                     2.521476e-05
## FLR                           2.521476e-05
## PoissonSeq                    2.521476e-05
## qualCI                        2.521476e-05
## RMallow                       2.521476e-05
## IMPACT                        2.521316e-05
## dirmcmc                       2.520931e-05
## diffIRT                       2.519608e-05
## mixcat                        2.519608e-05
## MVR                           2.519608e-05
## npmlreg                       2.519608e-05
## GillespieSSA                  2.519010e-05
## spikes                        2.517753e-05
## MuFiCokriging                 2.517054e-05
## lazy                          2.514438e-05
## discrimARTs                   2.513880e-05
## pathdiagram                   2.513831e-05
## symbols                       2.513831e-05
## gamlss.data                   2.513362e-05
## derivmkts                     2.511176e-05
## MaXact                        2.511176e-05
## PACBO                         2.511176e-05
## PLordprob                     2.511176e-05
## Sunder                        2.511176e-05
## timedelay                     2.511176e-05
## ClusteredMutations            2.508976e-05
## corrgram                      2.508976e-05
## pergola                       2.508976e-05
## qap                           2.508976e-05
## cyphid                        2.506282e-05
## fdatest                       2.506282e-05
## FRegSigCom                    2.506282e-05
## funHDDC                       2.506282e-05
## bezier                        2.503467e-05
## KOGMWU                        2.503121e-05
## qiimer                        2.503121e-05
## FinCovRegularization          2.499053e-05
## LCF                           2.499053e-05
## MixtureInf                    2.499053e-05
## MonoPoly                      2.499053e-05
## npsp                          2.499053e-05
## quadprogXT                    2.499053e-05
## SDT                           2.499053e-05
## SimCop                        2.499053e-05
## vottrans                      2.499053e-05
## arulesSequences               2.498866e-05
## IRdisplay                     2.498474e-05
## bacr                          2.497826e-05
## coarseDataTools               2.497826e-05
## CoinMinD                      2.497826e-05
## noncomplyR                    2.497826e-05
## ssmsn                         2.497826e-05
## GCD                           2.497739e-05
## pathview                      2.497336e-05
## AdapSamp                      2.495277e-05
## batteryreduction              2.495277e-05
## BINCOR                        2.495277e-05
## EMSC                          2.495277e-05
## mousetrack                    2.495277e-05
## OBRE                          2.495277e-05
## spftir                        2.495277e-05
## smaa                          2.493033e-05
## psy                           2.490580e-05
## PepSAVIms                     2.490184e-05
## ADCT                          2.489630e-05
## AdMit                         2.489630e-05
## asd                           2.489630e-05
## AssotesteR                    2.489630e-05
## BAEssd                        2.489630e-05
## BayesMAMS                     2.489630e-05
## BayesPieceHazSelect           2.489630e-05
## BayesPiecewiseICAR            2.489630e-05
## bcpmeta                       2.489630e-05
## bglm                          2.489630e-05
## Bmix                          2.489630e-05
## BNN                           2.489630e-05
## Bolstad                       2.489630e-05
## bpp                           2.489630e-05
## clikcorr                      2.489630e-05
## covsep                        2.489630e-05
## csn                           2.489630e-05
## depend.truncation             2.489630e-05
## depth.plot                    2.489630e-05
## DunnettTests                  2.489630e-05
## endogenous                    2.489630e-05
## ETC                           2.489630e-05
## FAmle                         2.489630e-05
## FMsmsnReg                     2.489630e-05
## hbim                          2.489630e-05
## hsmm                          2.489630e-05
## ifa                           2.489630e-05
## IMIS                          2.489630e-05
## JPEN                          2.489630e-05
## lmec                          2.489630e-05
## lrgs                          2.489630e-05
## MAMS                          2.489630e-05
## MitISEM                       2.489630e-05
## mpe                           2.489630e-05
## msma                          2.489630e-05
## multxpert                     2.489630e-05
## nicheROVER                    2.489630e-05
## parallelMCMCcombine           2.489630e-05
## phylometrics                  2.489630e-05
## rebmix                        2.489630e-05
## RidgeFusion                   2.489630e-05
## SamplerCompare                2.489630e-05
## samplesizelogisticcasecontrol 2.489630e-05
## samplingDataCRT               2.489630e-05
## SCRSELECT                     2.489630e-05
## selectiongain                 2.489630e-05
## SeleMix                       2.489630e-05
## SEMModComp                    2.489630e-05
## sharpr2                       2.489630e-05
## SSsimple                      2.489630e-05
## TAR                           2.489630e-05
## tilting                       2.489630e-05
## tlmec                         2.489630e-05
## TTmoment                      2.489630e-05
## rhdf5                         2.488147e-05
## bssn                          2.488040e-05
## semdiag                       2.485546e-05
## MethylCapSig                  2.485100e-05
## AquaEnv                       2.485060e-05
## mixtox                        2.485060e-05
## onls                          2.485060e-05
## Ritc                          2.485060e-05
## tumgr                         2.485060e-05
## ClickClust                    2.484749e-05
## micEconIndex                  2.484673e-05
## ihs                           2.482979e-05
## IntLik                        2.482979e-05
## oglmx                         2.482979e-05
## plus                          2.481353e-05
## optband                       2.479886e-05
## HandTill2001                  2.478243e-05
## fusionclust                   2.477699e-05
## tripack                       2.477257e-05
## activpalProcessing            2.476984e-05
## BusinessDuration              2.476984e-05
## dga                           2.476984e-05
## CHMM                          2.476702e-05
## LifeTables                    2.476702e-05
## npde                          2.476702e-05
## Simpsons                      2.476702e-05
## upclass                       2.476702e-05
## dhga                          2.476507e-05
## iDOS                          2.476507e-05
## monmlp                        2.476122e-05
## bio.infer                     2.474571e-05
## correlbinom                   2.473404e-05
## kerasR                        2.471660e-05
## onnx                          2.471660e-05
## BivRegBLS                     2.471108e-05
## MotilityLab                   2.471108e-05
## SciViews                      2.471108e-05
## operator.tools                2.470610e-05
## gamboostMSM                   2.469363e-05
## CARS                          2.469091e-05
## rpatrec                       2.469091e-05
## rateratio.test                2.469050e-05
## fANCOVA                       2.467748e-05
## rjpod                         2.466546e-05
## english                       2.466257e-05
## ionflows                      2.466031e-05
## CUB                           2.465279e-05
## DirectEffects                 2.465279e-05
## ExtremeBounds                 2.465279e-05
## ivfixed                       2.465279e-05
## ivpanel                       2.465279e-05
## ivprobit                      2.465279e-05
## LARF                          2.465279e-05
## thsls                         2.465279e-05
## tosls                         2.465279e-05
## scout                         2.465072e-05
## mogavs                        2.464239e-05
## glinternet                    2.464164e-05
## ComplexHeatmap                2.463687e-05
## arf3DS4                       2.462880e-05
## care                          2.462880e-05
## FPCA2D                        2.462880e-05
## Hotelling                     2.462880e-05
## metavcov                      2.462880e-05
## whitening                     2.462880e-05
## CCAGFA                        2.461324e-05
## labelrank                     2.461013e-05
## abn                           2.459859e-05
## pawacc                        2.459560e-05
## CNOGpro                       2.459108e-05
## DCODE                         2.459108e-05
## mlgt                          2.459108e-05
## sivipm                        2.459108e-05
## spgs                          2.459108e-05
## destiny                       2.457950e-05
## ropls                         2.455013e-05
## smotefamily                   2.454885e-05
## lss                           2.453856e-05
## plaqr                         2.453856e-05
## ptest                         2.453856e-05
## QRank                         2.453856e-05
## quantregGrowth                2.453856e-05
## Table1Heatmap                 2.452473e-05
## evclass                       2.452427e-05
## ider                          2.452427e-05
## xkcdcolors                    2.452427e-05
## ATR                           2.452251e-05
## ordinalRR                     2.451940e-05
## phenoCDM                      2.451940e-05
## PurBayes                      2.451940e-05
## MHCtools                      2.451470e-05
## strip                         2.451470e-05
## nat.utils                     2.450759e-05
## EMT                           2.450418e-05
## DeducerPlugInExample          2.450062e-05
## DeducerSurvival               2.450062e-05
## esvis                         2.449454e-05
## ICEbox                        2.449454e-05
## bootES                        2.448865e-05
## bootLR                        2.448865e-05
## deming                        2.448865e-05
## gb                            2.448865e-05
## GeneralOaxaca                 2.448865e-05
## Oncotree                      2.448865e-05
## ordinalCont                   2.448865e-05
## paramtest                     2.448865e-05
## popKorn                       2.448865e-05
## timesboot                     2.448865e-05
## tlm                           2.448865e-05
## dynamicGraph                  2.447933e-05
## mcheatmaps                    2.447151e-05
## qrnn                          2.446909e-05
## ABPS                          2.446439e-05
## BKPC                          2.446439e-05
## probsvm                       2.446439e-05
## svmadmm                       2.446439e-05
## SPIGA                         2.445584e-05
## ABCp2                         2.445281e-05
## acm4r                         2.445281e-05
## ACSWR                         2.445281e-05
## ActiveDriver                  2.445281e-05
## apple                         2.445281e-05
## averisk                       2.445281e-05
## bbemkr                        2.445281e-05
## BCEA                          2.445281e-05
## ber                           2.445281e-05
## BisRNA                        2.445281e-05
## bivrp                         2.445281e-05
## bootspecdens                  2.445281e-05
## bootStepAIC                   2.445281e-05
## catdata                       2.445281e-05
## ccda                          2.445281e-05
## ccmm                          2.445281e-05
## coloredICA                    2.445281e-05
## CompR                         2.445281e-05
## condvis                       2.445281e-05
## crp.CSFP                      2.445281e-05
## DAP                           2.445281e-05
## dejaVu                        2.445281e-05
## depmix                        2.445281e-05
## distance.sample.size          2.445281e-05
## DLASSO                        2.445281e-05
## dsample                       2.445281e-05
## EBS                           2.445281e-05
## eco                           2.445281e-05
## EcoSimR                       2.445281e-05
## elmNN                         2.445281e-05
## EMMIXuskew                    2.445281e-05
## EnviroStat                    2.445281e-05
## epifit                        2.445281e-05
## eventInterval                 2.445281e-05
## FixedPoint                    2.445281e-05
## forward                       2.445281e-05
## FuzzyAHP                      2.445281e-05
## GibbsACOV                     2.445281e-05
## glarma                        2.445281e-05
## GMDH                          2.445281e-05
## grouped                       2.445281e-05
## grt                           2.445281e-05
## gsarima                       2.445281e-05
## GSMX                          2.445281e-05
## heritability                  2.445281e-05
## HMVD                          2.445281e-05
## hnp                           2.445281e-05
## infoDecompuTE                 2.445281e-05
## InspectChangepoint            2.445281e-05
## IsoplotR                      2.445281e-05
## l2boost                       2.445281e-05
## lbreg                         2.445281e-05
## lestat                        2.445281e-05
## LICurvature                   2.445281e-05
## LMfilteR                      2.445281e-05
## LNIRT                         2.445281e-05
## loe                           2.445281e-05
## logistic4p                    2.445281e-05
## loop                          2.445281e-05
## mAr                           2.445281e-05
## mdscore                       2.445281e-05
## MGSDA                         2.445281e-05
## MixedTS                       2.445281e-05
## MLDS                          2.445281e-05
## multigroup                    2.445281e-05
## NB.MClust                     2.445281e-05
## NetIndices                    2.445281e-05
## nparLD                        2.445281e-05
## nsgp                          2.445281e-05
## optAUC                        2.445281e-05
## OrthoPanels                   2.445281e-05
## paran                         2.445281e-05
## pGLS                          2.445281e-05
## pnmtrem                       2.445281e-05
## probFDA                       2.445281e-05
## proteomicdesign               2.445281e-05
## provenance                    2.445281e-05
## purging                       2.445281e-05
## QPot                          2.445281e-05
## R0                            2.445281e-05
## ramchoice                     2.445281e-05
## rbmn                          2.445281e-05
## restrictedMVN                 2.445281e-05
## rSFA                          2.445281e-05
## rsq                           2.445281e-05
## sae2                          2.445281e-05
## SeqMADE                       2.445281e-05
## sgr                           2.445281e-05
## smallarea                     2.445281e-05
## smds                          2.445281e-05
## SPCALDA                       2.445281e-05
## SPCAvRP                       2.445281e-05
## spnn                          2.445281e-05
## stmgp                         2.445281e-05
## tailloss                      2.445281e-05
## TANOVA                        2.445281e-05
## truncgof                      2.445281e-05
## TSTutorial                    2.445281e-05
## VecStatGraphs2D               2.445281e-05
## VLMC                          2.445281e-05
## WARN                          2.445281e-05
## hei                           2.444930e-05
## eaf                           2.444820e-05
## PatternClass                  2.444681e-05
## raincpc                       2.444681e-05
## astrolibR                     2.444060e-05
## geomapdata                    2.442774e-05
## hhh4contacts                  2.442393e-05
## setter                        2.441609e-05
## equaltestMI                   2.439511e-05
## influence.SEM                 2.439511e-05
## NlsyLinks                     2.439511e-05
## simsem                        2.439511e-05
## EffectStars                   2.439278e-05
## GEVcdn                        2.439278e-05
## ordDisp                       2.439278e-05
## apercu                        2.436859e-05
## autopls                       2.436859e-05
## lspls                         2.436859e-05
## simmer.bricks                 2.436449e-05
## cssTools                      2.435166e-05
## egonet                        2.435166e-05
## ftsspec                       2.435166e-05
## NetCluster                    2.435166e-05
## Rambo                         2.435166e-05
## strategicplayers              2.435166e-05
## wpp2012                       2.434740e-05
## EMP                           2.434208e-05
## genMOSS                       2.434208e-05
## iRafNet                       2.434208e-05
## rocc                          2.434208e-05
## ModelGood                     2.433996e-05
## het.test                      2.433642e-05
## GoFKernel                     2.433083e-05
## ICE                           2.433083e-05
## IsoCI                         2.433083e-05
## CCpop                         2.433056e-05
## cosa                          2.433056e-05
## InfoTrad                      2.433056e-05
## dice                          2.432921e-05
## dynpanel                      2.432921e-05
## GSM                           2.432921e-05
## hier.part                     2.432921e-05
## interferenceCI                2.432921e-05
## JASPAR                        2.432921e-05
## mvtmeta                       2.432921e-05
## PolyPatEx                     2.432921e-05
## REQS                          2.432921e-05
## reservoir                     2.432921e-05
## rpsychi                       2.432921e-05
## rvHPDT                        2.432921e-05
## svs                           2.432921e-05
## OmicCircos                    2.432633e-05
## extrafontdb                   2.432054e-05
## Rttf2pt1                      2.432054e-05
## dielectric                    2.431297e-05
## dgodata                       2.430490e-05
## DMR                           2.429168e-05
## bmd                           2.428772e-05
## carData                       2.427869e-05
## covfefe                       2.427434e-05
## RChronoModel                  2.427287e-05
## ref                           2.426059e-05
## GriegSmith                    2.425956e-05
## ppmlasso                      2.425956e-05
## SGCS                          2.425956e-05
## siplab                        2.425956e-05
## SpatEntropy                   2.425956e-05
## spatialkernel                 2.425956e-05
## spatialsegregation            2.425956e-05
## RSKC                          2.425823e-05
## allanvar                      2.425656e-05
## FLLat                         2.425656e-05
## GMD                           2.425656e-05
## highSCREEN                    2.425656e-05
## KSEAapp                       2.425656e-05
## Meth27QC                      2.425656e-05
## PK                            2.425390e-05
## BiDimRegression               2.425269e-05
## covBM                         2.425269e-05
## CpGassoc                      2.425269e-05
## eba                           2.425269e-05
## far                           2.425269e-05
## FlexParamCurve                2.425269e-05
## ipdmeta                       2.425269e-05
## JoSAE                         2.425269e-05
## likelihood                    2.425269e-05
## LoopAnalyst                   2.425269e-05
## lucid                         2.425269e-05
## MethComp                      2.425269e-05
## MethodCompare                 2.425269e-05
## scan                          2.425269e-05
## scdhlm                        2.425269e-05
## catIrt                        2.424740e-05
## chandwich                     2.424740e-05
## CompLognormal                 2.424740e-05
## DoubleExpSeq                  2.424740e-05
## EKMCMC                        2.424740e-05
## gim                           2.424740e-05
## multicmp                      2.424740e-05
## nmw                           2.424740e-05
## wnl                           2.424740e-05
## cenGAM                        2.424296e-05
## coenoflex                     2.424296e-05
## ibr                           2.424296e-05
## iRegression                   2.424296e-05
## MAPLES                        2.424296e-05
## MHTrajectoryR                 2.424296e-05
## modTempEff                    2.424296e-05
## MvBinary                      2.424296e-05
## PanJen                        2.424296e-05
## poptrend                      2.424296e-05
## RAPTOR                        2.424296e-05
## slp                           2.424296e-05
## xwf                           2.424296e-05
## prof.tree                     2.424198e-05
## etrunct                       2.423949e-05
## spark                         2.422806e-05
## CBCgrps                       2.422429e-05
## mr.raps                       2.422429e-05
## mise                          2.421990e-05
## sprex                         2.421817e-05
## animalTrack                   2.421376e-05
## cubing                        2.421376e-05
## DGVM3D                        2.421376e-05
## ecdfHT                        2.421376e-05
## foodweb                       2.421376e-05
## hiPOD                         2.421376e-05
## MSQC                          2.421376e-05
## QuantifQuantile               2.421376e-05
## rglwidget                     2.421376e-05
## VDA                           2.421376e-05
## pom                           2.420021e-05
## heatmap3                      2.419526e-05
## ComICS                        2.418886e-05
## DivMelt                       2.418886e-05
## glmnetcr                      2.418886e-05
## glmtlp                        2.418886e-05
## LassoSIR                      2.418886e-05
## maxnet                        2.418886e-05
## MWRidge                       2.418886e-05
## PAS                           2.418886e-05
## bizdays                       2.418282e-05
## bootsPLS                      2.418134e-05
## PCA4you                       2.418134e-05
## YuGene                        2.418134e-05
## widgetTools                   2.417072e-05
## lsr                           2.416895e-05
## pcse                          2.416893e-05
## eulerian                      2.416469e-05
## CalibrateSSB                  2.415164e-05
## convey                        2.415164e-05
## ssfit                         2.415164e-05
## svyPVpack                     2.415164e-05
## detrendeR                     2.413557e-05
## TRADER                        2.413557e-05
## tinytex                       2.412676e-05
## clustertend                   2.412434e-05
## adaptTest                     2.412146e-05
## apc                           2.412146e-05
## backtest                      2.412146e-05
## cwhmisc                       2.412146e-05
## EngrExpt                      2.412146e-05
## erboost                       2.412146e-05
## factorQR                      2.412146e-05
## ICEinfer                      2.412146e-05
## InvasionCorrection            2.412146e-05
## isa2                          2.412146e-05
## kzs                           2.412146e-05
## MDR                           2.412146e-05
## mountainplot                  2.412146e-05
## npROCRegression               2.412146e-05
## ohtadstats                    2.412146e-05
## OLScurve                      2.412146e-05
## onlineVAR                     2.412146e-05
## optiscale                     2.412146e-05
## pbo                           2.412146e-05
## SALTSampler                   2.412146e-05
## semPLS                        2.412146e-05
## sExtinct                      2.412146e-05
## sme                           2.412146e-05
## stripless                     2.412146e-05
## svdvisual                     2.412146e-05
## TDboost                       2.412146e-05
## violinmplot                   2.412146e-05
## waterfall                     2.412146e-05
## airGR                         2.411800e-05
## lisrelToR                     2.411593e-05
## Daim                          2.410889e-05
## ordcrm                        2.410889e-05
## ggtree                        2.410649e-05
## caRamel                       2.409046e-05
## disp2D                        2.409046e-05
## pdfCluster                    2.409046e-05
## CpGFilter                     2.408440e-05
## InfiniumPurify                2.408440e-05
## kpmt                          2.408440e-05
## matrixTests                   2.408440e-05
## peakPick                      2.408440e-05
## vortexRdata                   2.408426e-05
## lpmodeler                     2.408078e-05
## maptpx                        2.408078e-05
## robustfa                      2.407702e-05
## Miso                          2.407456e-05
## alr3                          2.407406e-05
## ART                           2.407406e-05
## bbw                           2.407406e-05
## ecm                           2.407406e-05
## genridge                      2.407406e-05
## granova                       2.407406e-05
## panelAR                       2.407406e-05
## quantification                2.407406e-05
## quickregression               2.407406e-05
## specificity                   2.407406e-05
## anim.plots                    2.406239e-05
## BMAmevt                       2.405539e-05
## c212                          2.405539e-05
## codadiags                     2.405539e-05
## elrm                          2.405539e-05
## endorse                       2.405539e-05
## EpiILM                        2.405539e-05
## EpiILMCT                      2.405539e-05
## evolvability                  2.405539e-05
## hSDM                          2.405539e-05
## HybridMC                      2.405539e-05
## phcfM                         2.405539e-05
## popReconstruct                2.405539e-05
## SPACECAP                      2.405539e-05
## sspse                         2.405539e-05
## censorcopula                  2.405093e-05
## NHANES                        2.404743e-05
## df2json                       2.404029e-05
## rethinker                     2.404029e-05
## lazyData                      2.403581e-05
## BiG                           2.402706e-05
## RCRnorm                       2.402706e-05
## bimixt                        2.402142e-05
## reportROC                     2.402142e-05
## tpAUC                         2.402142e-05
## TukeyC                        2.401561e-05
## blender                       2.400174e-05
## cocorresp                     2.400174e-05
## CommunityCorrelogram          2.400174e-05
## forams                        2.400174e-05
## mpmcorrelogram                2.400174e-05
## ordiBreadth                   2.400174e-05
## rareNMtests                   2.400174e-05
## simba                         2.400174e-05
## NetComp                       2.398985e-05
## pSI                           2.398985e-05
## biasbetareg                   2.398922e-05
## oc                            2.396809e-05
## mapplots                      2.396247e-05
## weathermetrics                2.396186e-05
## NatureSounds                  2.395225e-05
## bayesloglin                   2.395047e-05
## corclass                      2.395047e-05
## diffee                        2.395047e-05
## DirectedClustering            2.395047e-05
## disparityfilter               2.395047e-05
## ebdbNet                       2.395047e-05
## fasjem                        2.395047e-05
## FCMapper                      2.395047e-05
## GeneReg                       2.395047e-05
## gRapfa                        2.395047e-05
## GraphFactor                   2.395047e-05
## igraphtosonia                 2.395047e-05
## InteractiveIGraph             2.395047e-05
## maxmatching                   2.395047e-05
## mazeGen                       2.395047e-05
## neat                          2.395047e-05
## nets                          2.395047e-05
## NetSwan                       2.395047e-05
## OutrankingTools               2.395047e-05
## PAGI                          2.395047e-05
## parsec                        2.395047e-05
## VertexSimilarity              2.395047e-05
## wfg                           2.395047e-05
## dams                          2.394409e-05
## pullword                      2.394409e-05
## rDVR                          2.394409e-05
## rjazz                         2.394409e-05
## RKlout                        2.394409e-05
## rLTP                          2.394409e-05
## Rodam                         2.394409e-05
## RSmartlyIO                    2.394409e-05
## Rtts                          2.394409e-05
## psgp                          2.393985e-05
## aidar                         2.393481e-05
## belex                         2.393481e-05
## compareODM                    2.393481e-05
## easyPubMed                    2.393481e-05
## EcoTroph                      2.393481e-05
## graphicsQC                    2.393481e-05
## mseapca                       2.393481e-05
## myepisodes                    2.393481e-05
## readMLData                    2.393481e-05
## rLDCP                         2.393481e-05
## SequenceAnalysis              2.393481e-05
## StatDataML                    2.393481e-05
## TFX                           2.393481e-05
## spatial                       2.392868e-05
## SoundexBR                     2.392602e-05
## protoclass                    2.391820e-05
## ABCanalysis                   2.390166e-05
## dupiR                         2.390166e-05
## epade                         2.390166e-05
## TSVC                          2.390166e-05
## ProjectTemplate               2.389295e-05
## bayesQR                       2.389214e-05
## apdesign                      2.388697e-05
## bayesGDS                      2.388697e-05
## CLSOCP                        2.388697e-05
## cthreshER                     2.388697e-05
## dglars                        2.388697e-05
## EMMREML                       2.388697e-05
## fanc                          2.388697e-05
## fastcox                       2.388697e-05
## FastImputation                2.388697e-05
## FREGAT                        2.388697e-05
## FTRLProximal                  2.388697e-05
## gcdnet                        2.388697e-05
## higrad                        2.388697e-05
## icdGLM                        2.388697e-05
## klin                          2.388697e-05
## mapfit                        2.388697e-05
## multiAssetOptions             2.388697e-05
## nopaco                        2.388697e-05
## ORDER2PARENT                  2.388697e-05
## PivotalR                      2.388697e-05
## pulsar                        2.388697e-05
## pvclass                       2.388697e-05
## QZ                            2.388697e-05
## rmatio                        2.388697e-05
## SALES                         2.388697e-05
## sdpt3r                        2.388697e-05
## sdwd                          2.388697e-05
## SimInf                        2.388697e-05
## SOR                           2.388697e-05
## sparsestep                    2.388697e-05
## sumFREGAT                     2.388697e-05
## threeboost                    2.388697e-05
## pbs                           2.388271e-05
## abodOutlier                   2.388031e-05
## anocva                        2.388031e-05
## ccChooser                     2.388031e-05
## CrossClustering               2.388031e-05
## divo                          2.388031e-05
## hkclustering                  2.388031e-05
## hybridHclust                  2.388031e-05
## knnGarden                     2.388031e-05
## RPMM                          2.388031e-05
## datacheckr                    2.387611e-05
## sgmcmc                        2.387425e-05
## rbugs                         2.386186e-05
## ecospace                      2.385704e-05
## cdcsis                        2.384478e-05
## genoPlotR                     2.384002e-05
## gTests                        2.384002e-05
## Laterality                    2.384002e-05
## oncomodel                     2.384002e-05
## subniche                      2.384002e-05
## dotCall64                     2.383375e-05
## curvecomp                     2.381612e-05
## bcrypt                        2.381516e-05
## linLIR                        2.380352e-05
## bamsignals                    2.379751e-05
## aqfig                         2.379098e-05
## inspectr                      2.378316e-05
## tablaxlsx                     2.378316e-05
## deepnet                       2.378202e-05
## packS4                        2.378023e-05
## gbm2sas                       2.377553e-05
## dcminfo                       2.377495e-05
## RM2                           2.376488e-05
## score                         2.376488e-05
## gbRd                          2.375916e-05
## bagRboostR                    2.375548e-05
## imputeMissings                2.375548e-05
## OTE                           2.375548e-05
## partitionMap                  2.375548e-05
## varSelRF                      2.375548e-05
## memuse                        2.374459e-05
## pinfsc50                      2.374459e-05
## simpleCache                   2.373882e-05
## binst                         2.373570e-05
## DidacticBoost                 2.373570e-05
## GPLTR                         2.373570e-05
## Harvest.Tree                  2.373570e-05
## rpartScore                    2.373570e-05
## LearnGeom                     2.371459e-05
## ACTCD                         2.371382e-05
## devEMF                        2.369981e-05
## deadband                      2.369730e-05
## brotli                        2.368891e-05
## infraFDTD.assist              2.368234e-05
## stilt                         2.368234e-05
## SynchWave                     2.368234e-05
## Voss                          2.368234e-05
## httpRequest                   2.367978e-05
## represtools                   2.365788e-05
## rslurm                        2.365788e-05
## AMModels                      2.365066e-05
## tsSelect                      2.364599e-05
## PhysicalActivity              2.364542e-05
## R2G2                          2.364450e-05
## BayesTree                     2.363322e-05
## HIest                         2.363322e-05
## ImpactIV                      2.363322e-05
## LOGICOIL                      2.363322e-05
## MDM                           2.363322e-05
## partialOR                     2.363322e-05
## clusterPower                  2.362707e-05
## gtheory                       2.362707e-05
## MEMSS                         2.362707e-05
## MixMAP                        2.362707e-05
## mlmRev                        2.362707e-05
## nonrandom                     2.362707e-05
## welchADF                      2.362707e-05
## csvread                       2.361799e-05
## GeoGenetix                    2.361643e-05
## phalen                        2.360227e-05
## spsi                          2.360206e-05
## PCA4TS                        2.359814e-05
## gplm                          2.359007e-05
## Taxonstand                    2.358954e-05
## MassSpecWavelet               2.358215e-05
## RCircos                       2.356426e-05
## dggrids                       2.355590e-05
## redR                          2.355165e-05
## md.log                        2.354992e-05
## reporttools                   2.354238e-05
## rplotengine                   2.354238e-05
## TableMonster                  2.354238e-05
## BurStFin                      2.354188e-05
## MMWRweek                      2.352213e-05
## acmeR                         2.351965e-05
## read.dbc                      2.351965e-05
## rsatscan                      2.351965e-05
## RStata                        2.351965e-05
## heuristica                    2.351687e-05
## multiselect                   2.351687e-05
## progenyClust                  2.351687e-05
## rmngb                         2.351687e-05
## WRSS                          2.351687e-05
## bigleaf                       2.349944e-05
## CerioliOutlierDetection       2.349944e-05
## ForwardSearch                 2.349944e-05
## pyinit                        2.349944e-05
## GetR                          2.349585e-05
## ssc                           2.349568e-05
## janeaustenr                   2.348292e-05
## seqCBS                        2.347535e-05
## Boruta                        2.344654e-05
## somplot                       2.343456e-05
## CombMSC                       2.342228e-05
## alleHap                       2.341189e-05
## Bagidis                       2.341189e-05
## BCBCSF                        2.341189e-05
## population                    2.341189e-05
## pop.wolf                      2.341189e-05
## clubSandwich                  2.341115e-05
## inference                     2.341115e-05
## coenocliner                   2.339664e-05
## KSD                           2.337757e-05
## BBMV                          2.337597e-05
## jrich                         2.337597e-05
## ML.MSBD                       2.337597e-05
## phyloland                     2.337597e-05
## phylotools                    2.337597e-05
## phyndr                        2.337597e-05
## Rphylip                       2.337597e-05
## polysat                       2.337532e-05
## validann                      2.336865e-05
## clusterProfiler               2.336864e-05
## equate                        2.336252e-05
## MicroStrategyR                2.336175e-05
## wrassp                        2.335212e-05
## apaStyle                      2.333942e-05
## sROC                          2.333372e-05
## mvc                           2.330997e-05
## SpatialPack                   2.328883e-05
## SOFIA                         2.328698e-05
## EasyMx                        2.328528e-05
## glmmADMB                      2.327776e-05
## AMORE                         2.326678e-05
## gmt                           2.326678e-05
## PDM                           2.325489e-05
## arsenal                       2.325381e-05
## humanFormat                   2.325381e-05
## praise                        2.325381e-05
## stubthat                      2.325381e-05
## valection                     2.325381e-05
## reports                       2.324306e-05
## realestateDK                  2.324173e-05
## ClueR                         2.323137e-05
## hda                           2.323137e-05
## malani                        2.323137e-05
## highlight                     2.322804e-05
## here                          2.322157e-05
## docstring                     2.321334e-05
## BLRPM                         2.317159e-05
## redux                         2.317159e-05
## ring                          2.317159e-05
## rstack                        2.317159e-05
## rtson                         2.317159e-05
## epinet                        2.317123e-05
## haplotypes                    2.317123e-05
## mpa                           2.317123e-05
## networksis                    2.317123e-05
## bisectr                       2.316547e-05
## datr                          2.316547e-05
## prodigenr                     2.316547e-05
## PSPManalysis                  2.316547e-05
## rbundler                      2.316547e-05
## rdoxygen                      2.316547e-05
## wru                           2.316547e-05
## argosfilter                   2.316398e-05
## ncbit                         2.315811e-05
## dcv                           2.315227e-05
## orcutt                        2.315227e-05
## orddom                        2.315186e-05
## betategarch                   2.314137e-05
## DBEST                         2.314137e-05
## dyn                           2.314137e-05
## dyncomp                       2.314137e-05
## EloRating                     2.314137e-05
## Evapotranspiration            2.314137e-05
## FlowRegEnvCost                2.314137e-05
## gets                          2.314137e-05
## RelValAnalysis                2.314137e-05
## statcomp                      2.314137e-05
## enc                           2.311402e-05
## PreciseSums                   2.311315e-05
## FCNN4R                        2.310564e-05
## RcppXPtrUtils                 2.310564e-05
## TAQMNGR                       2.310564e-05
## sparsepp                      2.310381e-05
## SoDA                          2.310052e-05
## hues                          2.309508e-05
## passport                      2.309080e-05
## breakfast                     2.307829e-05
## ChemoSpec                     2.307829e-05
## comf                          2.307829e-05
## learningr                     2.307829e-05
## MetaboQC                      2.307829e-05
## MScombine                     2.307829e-05
## okmesonet                     2.307829e-05
## processcontrol                2.307829e-05
## rcqp                          2.307829e-05
## readbulk                      2.307829e-05
## RStorm                        2.307829e-05
## sequoia                       2.307829e-05
## sinaplot                      2.307829e-05
## spiders                       2.307829e-05
## StagedChoiceSplineMix         2.307829e-05
## StratifiedBalancing           2.307829e-05
## TDPanalysis                   2.307829e-05
## treecm                        2.307829e-05
## unitedR                       2.307829e-05
## zTree                         2.307829e-05
## CAST                          2.307361e-05
## ensembleR                     2.307361e-05
## ESKNN                         2.307361e-05
## emme2                         2.307177e-05
## Rdsm                          2.306758e-05
## birdnik                       2.306659e-05
## DrillR                        2.306659e-05
## icesTAF                       2.306659e-05
## ores                          2.306659e-05
## osi                           2.306659e-05
## pdftables                     2.306659e-05
## Rcolombos                     2.306659e-05
## RCzechia                      2.306659e-05
## rfoaas                        2.306659e-05
## rollbar                       2.306659e-05
## rwars                         2.306659e-05
## TCGAretriever                 2.306659e-05
## threewords                    2.306659e-05
## transcribeR                   2.306659e-05
## whoapi                        2.306659e-05
## Ac3net                        2.306251e-05
## assertable                    2.306251e-05
## benford.analysis              2.306251e-05
## Census2016                    2.306251e-05
## constellation                 2.306251e-05
## funchir                       2.306251e-05
## inbreedR                      2.306251e-05
## PakPMICS2014Ch                2.306251e-05
## PakPMICS2014HH                2.306251e-05
## PakPMICS2014HL                2.306251e-05
## PakPMICS2014Wm                2.306251e-05
## panelaggregation              2.306251e-05
## patternator                   2.306251e-05
## pointdensityP                 2.306251e-05
## rbtt                          2.306251e-05
## Rdice                         2.306251e-05
## rODE                          2.306251e-05
## SGPdata                       2.306251e-05
## StatMeasures                  2.306251e-05
## tableMatrix                   2.306251e-05
## ttwa                          2.306251e-05
## votesys                       2.306251e-05
## MCS                           2.305032e-05
## blockmodeling                 2.302005e-05
## adagio                        2.299200e-05
## aimPlot                       2.298270e-05
## BioStatR                      2.298270e-05
## brt                           2.298270e-05
## CALF                          2.298270e-05
## choroplethrAdmin1             2.298270e-05
## climbeR                       2.298270e-05
## dfexplore                     2.298270e-05
## DiallelAnalysisR              2.298270e-05
## dslabs                        2.298270e-05
## EDA                           2.298270e-05
## exploreR                      2.298270e-05
## funnelR                       2.298270e-05
## genomeplot                    2.298270e-05
## gggenes                       2.298270e-05
## ggpolypath                    2.298270e-05
## ggROC                         2.298270e-05
## ggseqlogo                     2.298270e-05
## ggswissmaps                   2.298270e-05
## ghibli                        2.298270e-05
## iJRF                          2.298270e-05
## jtools                        2.298270e-05
## kmed                          2.298270e-05
## LexisPlotR                    2.298270e-05
## listdtr                       2.298270e-05
## logihist                      2.298270e-05
## logisticPCA                   2.298270e-05
## mekko                         2.298270e-05
## nhstplot                      2.298270e-05
## nord                          2.298270e-05
## OmicsPLS                      2.298270e-05
## pa                            2.298270e-05
## ParallelTree                  2.298270e-05
## PASenseWear                   2.298270e-05
## permubiome                    2.298270e-05
## qcQpcr                        2.298270e-05
## QCSimulator                   2.298270e-05
## RImagePalette                 2.298270e-05
## shadowtext                    2.298270e-05
## timeline                      2.298270e-05
## tsfknn                        2.298270e-05
## vrcp                          2.298270e-05
## waterfalls                    2.298270e-05
## zooaRch                       2.298270e-05
## beast                         2.292021e-05
## clustMixType                  2.292021e-05
## LPStimeSeries                 2.292021e-05
## Mondrian                      2.292021e-05
## MSG                           2.292021e-05
## MullerPlot                    2.292021e-05
## mvtsplot                      2.292021e-05
## qPCR.CT                       2.292021e-05
## rafalib                       2.292021e-05
## RFLPtools                     2.292021e-05
## WrightMap                     2.290118e-05
## itertools2                    2.289557e-05
## ssa                           2.289557e-05
## BetaBit                       2.287615e-05
## cronR                         2.287615e-05
## glmbb                         2.287615e-05
## memo                          2.287615e-05
## proton                        2.287615e-05
## repo                          2.287615e-05
## simpleRCache                  2.287615e-05
## exCon                         2.284992e-05
## franc                         2.284992e-05
## MBTAr                         2.284992e-05
## pandocfilters                 2.284992e-05
## rcorpora                      2.284992e-05
## RDataCanvas                   2.284992e-05
## furniture                     2.284507e-05
## kfigr                         2.284507e-05
## knitLatex                     2.284507e-05
## printr                        2.284507e-05
## Rd2md                         2.284507e-05
## SASmarkdown                   2.284507e-05
## svSweave                      2.284507e-05
## sigclust                      2.281620e-05
## cleanr                        2.279002e-05
## comorbidity                   2.279002e-05
## rscimark                      2.279002e-05
## CAISEr                        2.278593e-05
## ExpDE                         2.278593e-05
## listWithDefaults              2.278593e-05
## luzlogr                       2.278593e-05
## remindR                       2.278593e-05
## gpg                           2.277456e-05
## cotrend                       2.277317e-05
## qrmdata                       2.277317e-05
## TSEtools                      2.277317e-05
## YieldCurve                    2.277317e-05
## fitPoly                       2.277302e-05
## mazeinda                      2.277302e-05
## MetaPCA                       2.277302e-05
## selfingTree                   2.277302e-05
## rstiefel                      2.276001e-05
## choroplethrMaps               2.275157e-05
## datamap                       2.273681e-05
## genomicper                    2.273681e-05
## canvasXpress                  2.269434e-05
## diffr                         2.269434e-05
## focusedMDS                    2.269434e-05
## mindr                         2.269434e-05
## qrage                         2.269434e-05
## asciiruler                    2.268405e-05
## badgecreatr                   2.268405e-05
## commentr                      2.268405e-05
## detector                      2.268405e-05
## genemodel                     2.268405e-05
## hypercube                     2.268405e-05
## IDCard                        2.268405e-05
## keyringr                      2.268405e-05
## lero.lero                     2.268405e-05
## lettercase                    2.268405e-05
## LindenmayeR                   2.268405e-05
## MSbox                         2.268405e-05
## readJDX                       2.268405e-05
## recoder                       2.268405e-05
## revengc                       2.268405e-05
## RSMET                         2.268405e-05
## ssh.utils                     2.268405e-05
## String2AdjMatrix              2.268405e-05
## stringformattr                2.268405e-05
## touch                         2.268405e-05
## bullwhipgame                  2.268336e-05
## bunchr                        2.268336e-05
## EMSaov                        2.268336e-05
## gamesGA                       2.268336e-05
## ioncopy                       2.268336e-05
## rclipboard                    2.268336e-05
## shinyLP                       2.268336e-05
## shinymaterial                 2.268336e-05
## shinytoastr                   2.268336e-05
## shinyTree                     2.268336e-05
## sourcetools                   2.268336e-05
## csvy                          2.266904e-05
## recombinator                  2.266466e-05
## prereg                        2.264159e-05
## revealjs                      2.264159e-05
## rmdshower                     2.264159e-05
## uiucthemes                    2.264159e-05
## SamplingStrata                2.263641e-05
## hazus                         2.262092e-05
## mandelbrot                    2.262092e-05
## pdolsms                       2.262092e-05
## tmpm                          2.262092e-05
## spark.sas7bdat                2.261888e-05
## phylotate                     2.258938e-05
## biomformat                    2.258938e-05
## ASGS.foyer                    2.256421e-05
## csrplus                       2.256421e-05
## orsifronts                    2.256421e-05
## USGSstates2k                  2.256421e-05
## vec2dtransf                   2.256421e-05
## wkb                           2.256421e-05
## gcookbook                     2.254630e-05
## GRaF                          2.253602e-05
## log4r                         2.252622e-05
## webuse                        2.250850e-05
## BMRV                          2.250768e-05
## comparer                      2.249445e-05
## horizon                       2.245485e-05
## kissmig                       2.245485e-05
## maxlike                       2.245485e-05
## osc                           2.245485e-05
## rasterKernelEstimates         2.245485e-05
## rasterList                    2.245485e-05
## grnn                          2.236552e-05
## linemap                       2.226414e-05
## smoothr                       2.226414e-05
## PRISMAstatement               2.224602e-05
## earthtones                    2.221597e-05
## UScancer                      2.221376e-05
## eventdataR                    2.221216e-05
## gpclib                        2.221191e-05
## CrossVA                       2.218993e-05
## esmprep                       2.218993e-05
## naptime                       2.218993e-05
## cometExactTest                2.217309e-05
## dataMeta                      2.217309e-05
## didrooRFM                     2.217309e-05
## discord                       2.217309e-05
## frequencies                   2.217309e-05
## Lahman                        2.217309e-05
## parSim                        2.217309e-05
## plater                        2.217309e-05
## turfR                         2.217309e-05
## wec                           2.217309e-05
## whereport                     2.217309e-05
## woeR                          2.217309e-05
## needs                         2.214304e-05
## eply                          2.205202e-05
## grapes                        2.205202e-05
## optional                      2.205202e-05
## simulator                     2.205202e-05
## sudokuAlt                     2.205202e-05
## di                            2.197950e-05
## mockr                         2.194233e-05
## sqlscore                      2.192517e-05
## billboard                     2.180744e-05
## gapminder                     2.180744e-05
## nycflights13                  2.180744e-05
## pinnacle.data                 2.180744e-05
## railtrails                    2.180744e-05
## repurrrsive                   2.180744e-05
## MicroDatosEs                  2.179676e-05
## readroper                     2.179676e-05
## dynprog                       2.175626e-05
## fabricatr                     2.175626e-05
## nofrills                      2.175626e-05
## usfertilizer                  2.155508e-05
## ABC.RAP                       1.396330e-05
## abe                           1.396330e-05
## abf2                          1.396330e-05
## ACA                           1.396330e-05
## AcceptanceSampling            1.396330e-05
## ACCLMA                        1.396330e-05
## accrued                       1.396330e-05
## ACD                           1.396330e-05
## acopula                       1.396330e-05
## additivityTests               1.396330e-05
## ADM3                          1.396330e-05
## ADPF                          1.396330e-05
## afc                           1.396330e-05
## affluenceIndex                1.396330e-05
## afpt                          1.396330e-05
## aggregation                   1.396330e-05
## agridat                       1.396330e-05
## agrmt                         1.396330e-05
## aiRthermo                     1.396330e-05
## Ake                           1.396330e-05
## akmeans                       1.396330e-05
## albopictus                    1.396330e-05
## AlgebraicHaploPackage         1.396330e-05
## alineR                        1.396330e-05
## AlleleRetain                  1.396330e-05
## allelic                       1.396330e-05
## AllPossibleSpellings          1.396330e-05
## alluvial                      1.396330e-05
## ALSCPC                        1.396330e-05
## altmeta                       1.396330e-05
## AMAP.Seq                      1.396330e-05
## AMCP                          1.396330e-05
## AMCTestmakeR                  1.396330e-05
## ameco                         1.396330e-05
## amei                          1.396330e-05
## amelie                        1.396330e-05
## amen                          1.396330e-05
## AmericanCallOpt               1.396330e-05
## AMGET                         1.396330e-05
## AmmoniaConcentration          1.396330e-05
## ampd                          1.396330e-05
## analyz                        1.396330e-05
## anapuce                       1.396330e-05
## andrews                       1.396330e-05
## anfis                         1.396330e-05
## AnnotLists                    1.396330e-05
## anonymizer                    1.396330e-05
## APCanalysis                   1.396330e-05
## aplore3                       1.396330e-05
## appell                        1.396330e-05
## appnn                         1.396330e-05
## approxmatch                   1.396330e-05
## aprean3                       1.396330e-05
## aprof                         1.396330e-05
## APSIMBatch                    1.396330e-05
## apsrtable                     1.396330e-05
## arabicStemR                   1.396330e-05
## ArArRedux                     1.396330e-05
## archdata                      1.396330e-05
## ArDec                         1.396330e-05
## areaplot                      1.396330e-05
## argparser                     1.396330e-05
## ARHT                          1.396330e-05
## arnie                         1.396330e-05
## ARPobservation                1.396330e-05
## aRpsDCA                       1.396330e-05
## asaur                         1.396330e-05
## ascii                         1.396330e-05
## as.color                      1.396330e-05
## asdreader                     1.396330e-05
## aspect                        1.396330e-05
## aspi                          1.396330e-05
## assocInd                      1.396330e-05
## assortnet                     1.396330e-05
## astrodatR                     1.396330e-05
## asymLD                        1.396330e-05
## asympTest                     1.396330e-05
## AsynchLong                    1.396330e-05
## asypow                        1.396330e-05
## ATE                           1.396330e-05
## atmcmc                        1.396330e-05
## AtmRay                        1.396330e-05
## aTSA                          1.396330e-05
## atus                          1.396330e-05
## audit                         1.396330e-05
## AutoregressionMDE             1.396330e-05
## b6e6rl                        1.396330e-05
## babar                         1.396330e-05
## backpipe                      1.396330e-05
## bannerCommenter               1.396330e-05
## BaPreStoPro                   1.396330e-05
## BarBorGradient                1.396330e-05
## Barnard                       1.396330e-05
## BAS                           1.396330e-05
## basicspace                    1.396330e-05
## basicTrendline                1.396330e-05
## BASS                          1.396330e-05
## batch                         1.396330e-05
## bayesbio                      1.396330e-05
## bayesCL                       1.396330e-05
## BayesCombo                    1.396330e-05
## BayesDA                       1.396330e-05
## BayesH                        1.396330e-05
## bayesianETAS                  1.396330e-05
## BayesNI                       1.396330e-05
## BayesTreePrior                1.396330e-05
## BayesValidate                 1.396330e-05
## BayHaz                        1.396330e-05
## bbefkr                        1.396330e-05
## BBMM                          1.396330e-05
## bbo                           1.396330e-05
## BCC1997                       1.396330e-05
## BCDating                      1.396330e-05
## BCgee                         1.396330e-05
## bclust                        1.396330e-05
## BCRA                          1.396330e-05
## bda                           1.396330e-05
## bdpv                          1.396330e-05
## benchden                      1.396330e-05
## BenfordTests                  1.396330e-05
## bentcableAR                   1.396330e-05
## betacal                       1.396330e-05
## betafam                       1.396330e-05
## bethel                        1.396330e-05
## BGGE                          1.396330e-05
## bgmfiles                      1.396330e-05
## BGSIMD                        1.396330e-05
## Bhat                          1.396330e-05
## BibPlots                      1.396330e-05
## biclique                      1.396330e-05
## bigtcr                        1.396330e-05
## bikeshare14                   1.396330e-05
## bild                          1.396330e-05
## bimetallic                    1.396330e-05
## BinaryEMVS                    1.396330e-05
## binaryLogic                   1.396330e-05
## binford                       1.396330e-05
## binomialcftp                  1.396330e-05
## binomlogit                    1.396330e-05
## Biodem                        1.396330e-05
## BioFTF                        1.396330e-05
## biogas                        1.396330e-05
## BIOM.utils                    1.396330e-05
## bionetdata                    1.396330e-05
## bioPN                         1.396330e-05
## biotic                        1.396330e-05
## birtr                         1.396330e-05
## bitrugs                       1.396330e-05
## Bivariate.Pareto              1.396330e-05
## bivarRIpower                  1.396330e-05
## BlandAltmanLeh                1.396330e-05
## blendedLink                   1.396330e-05
## blighty                       1.396330e-05
## blm                           1.396330e-05
## BLModel                       1.396330e-05
## BlockMessage                  1.396330e-05
## blockrand                     1.396330e-05
## BNDataGenerator               1.396330e-05
## BNPdensity                    1.396330e-05
## bnpmr                         1.396330e-05
## bnpsd                         1.396330e-05
## BoardGames                    1.396330e-05
## bodenmiller                   1.396330e-05
## BootMRMR                      1.396330e-05
## BootPR                        1.396330e-05
## bootRes                       1.396330e-05
## bootruin                      1.396330e-05
## boussinesq                    1.396330e-05
## boxplotdbl                    1.396330e-05
## bPeaks                        1.396330e-05
## bpkde                         1.396330e-05
## bqtl                          1.396330e-05
## Branching                     1.396330e-05
## brea                          1.396330e-05
## bReeze                        1.396330e-05
## bride                         1.396330e-05
## bridgedist                    1.396330e-05
## brm                           1.396330e-05
## Brq                           1.396330e-05
## bspec                         1.396330e-05
## bspmma                        1.396330e-05
## BUCSS                         1.396330e-05
## bundesligR                    1.396330e-05
## BurStMisc                     1.396330e-05
## bursts                        1.396330e-05
## bvenn                         1.396330e-05
## bytescircle                   1.396330e-05
## c2c                           1.396330e-05
## cabootcrs                     1.396330e-05
## cacIRT                        1.396330e-05
## calACS                        1.396330e-05
## Calculator.LR.FNs             1.396330e-05
## capn                          1.396330e-05
## captioner                     1.396330e-05
## capwire                       1.396330e-05
## CARE1                         1.396330e-05
## caribou                       1.396330e-05
## CarletonStats                 1.396330e-05
## CARLIT                        1.396330e-05
## caroline                      1.396330e-05
## caseMatch                     1.396330e-05
## cat                           1.396330e-05
## catcont                       1.396330e-05
## catdap                        1.396330e-05
## CateSelection                 1.396330e-05
## catnet                        1.396330e-05
## catR                          1.396330e-05
## catspec                       1.396330e-05
## CATT                          1.396330e-05
## CATTexact                     1.396330e-05
## causalsens                    1.396330e-05
## CAvariants                    1.396330e-05
## cbanalysis                    1.396330e-05
## cbird                         1.396330e-05
## ccgarch                       1.396330e-05
## CCM                           1.396330e-05
## ccRemover                     1.396330e-05
## CDFt                          1.396330e-05
## CDLasso                       1.396330e-05
## CDNmoney                      1.396330e-05
## CDROM                         1.396330e-05
## CEC                           1.396330e-05
## cec2005benchmark              1.396330e-05
## cec2013                       1.396330e-05
## censNID                       1.396330e-05
## CensRegMod                    1.396330e-05
## cents                         1.396330e-05
## cepreader                     1.396330e-05
## cernn                         1.396330e-05
## cetcolor                      1.396330e-05
## cfa                           1.396330e-05
## CfEstimateQuantiles           1.396330e-05
## cggd                          1.396330e-05
## cgh                           1.396330e-05
## cghFLasso                     1.396330e-05
## CGP                           1.396330e-05
## ChangepointTesting            1.396330e-05
## Chaos01                       1.396330e-05
## ChargeTransport               1.396330e-05
## cheb                          1.396330e-05
## chebpol                       1.396330e-05
## checkarg                      1.396330e-05
## CheckDigit                    1.396330e-05
## checkpoint                    1.396330e-05
## cheddar                       1.396330e-05
## chemCal                       1.396330e-05
## CHFF                          1.396330e-05
## chi                           1.396330e-05
## chi2x3way                     1.396330e-05
## ChIPtest                      1.396330e-05
## ChoiceModelR                  1.396330e-05
## CholWishart                   1.396330e-05
## choplump                      1.396330e-05
## CIFsmry                       1.396330e-05
## cin                           1.396330e-05
## CINID                         1.396330e-05
## cir                           1.396330e-05
## CircE                         1.396330e-05
## CircNNTSR                     1.396330e-05
## cit                           1.396330e-05
## citbcmst                      1.396330e-05
## citccmst                      1.396330e-05
## CityPlot                      1.396330e-05
## CLA                           1.396330e-05
## clam                          1.396330e-05
## ClamR                         1.396330e-05
## climatol                      1.396330e-05
## clinsig                       1.396330e-05
## clinUtiDNA                    1.396330e-05
## cloudUtil                     1.396330e-05
## clttools                      1.396330e-05
## clust.bin.pair                1.396330e-05
## ClusterBootstrap              1.396330e-05
## cluster.datasets              1.396330e-05
## clusterGenomics               1.396330e-05
## clusterhap                    1.396330e-05
## clustering.sc.dp              1.396330e-05
## ClusterRankTest               1.396330e-05
## clusterRepro                  1.396330e-05
## clustsig                      1.396330e-05
## CMC                           1.396330e-05
## cmna                          1.396330e-05
## CMplot                        1.396330e-05
## CNVassocData                  1.396330e-05
## COBRA                         1.396330e-05
## COCONUT                       1.396330e-05
## codep                         1.396330e-05
## coexist                       1.396330e-05
## colmozzie                     1.396330e-05
## colorfulVennPlot              1.396330e-05
## colorhcplot                   1.396330e-05
## ColorPalette                  1.396330e-05
## colorr                        1.396330e-05
## colortools                    1.396330e-05
## colr                          1.396330e-05
## Combine                       1.396330e-05
## CombinePortfolio              1.396330e-05
## CombinePValue                 1.396330e-05
## CombinS                       1.396330e-05
## comclim                       1.396330e-05
## commandr                      1.396330e-05
## compactr                      1.396330e-05
## compareC                      1.396330e-05
## CompareTests                  1.396330e-05
## compHclust                    1.396330e-05
## COMPoissonReg                 1.396330e-05
## CompRandFld                   1.396330e-05
## Conake                        1.396330e-05
## concatenate                   1.396330e-05
## conclust                      1.396330e-05
## concor                        1.396330e-05
## concordance                   1.396330e-05
## conditions                    1.396330e-05
## CondReg                       1.396330e-05
## conf                          1.396330e-05
## confinterpret                 1.396330e-05
## confSAM                       1.396330e-05
## conics                        1.396330e-05
## ConjointChecks                1.396330e-05
## ConnMatTools                  1.396330e-05
## conover.test                  1.396330e-05
## constants                     1.396330e-05
## ContourFunctions              1.396330e-05
## ConvCalendar                  1.396330e-05
## convertGraph                  1.396330e-05
## coppeCosenzaR                 1.396330e-05
## copulaData                    1.396330e-05
## Copula.Markov                 1.396330e-05
## CORE                          1.396330e-05
## coreTDT                       1.396330e-05
## corlink                       1.396330e-05
## corpora                       1.396330e-05
## CorrectedFDR                  1.396330e-05
## corrsieve                     1.396330e-05
## corset                        1.396330e-05
## corTools                      1.396330e-05
## cosmoFns                      1.396330e-05
## covreg                        1.396330e-05
## covRobust                     1.396330e-05
## coxsei                        1.396330e-05
## cpa                           1.396330e-05
## cpca                          1.396330e-05
## CPHshape                      1.396330e-05
## cpk                           1.396330e-05
## cplexAPI                      1.396330e-05
## cprr                          1.396330e-05
## cptcity                       1.396330e-05
## CR                            1.396330e-05
## CRAC                          1.396330e-05
## crank                         1.396330e-05
## crantastic                    1.396330e-05
## crblocks                      1.396330e-05
## CREAM                         1.396330e-05
## CreditMetrics                 1.396330e-05
## credsubs                      1.396330e-05
## credule                       1.396330e-05
## crimCV                        1.396330e-05
## CRM                           1.396330e-05
## crop                          1.396330e-05
## cropdatape                    1.396330e-05
## crossReg                      1.396330e-05
## crsnls                        1.396330e-05
## CRTSize                       1.396330e-05
## csp                           1.396330e-05
## csSAM                         1.396330e-05
## cstar                         1.396330e-05
## cts                           1.396330e-05
## ctv                           1.396330e-05
## CuCubes                       1.396330e-05
## CUMP                          1.396330e-05
## cumplyr                       1.396330e-05
## cumstats                      1.396330e-05
## curry                         1.396330e-05
## cusp                          1.396330e-05
## CUSUMdesign                   1.396330e-05
## cuttlefish.model              1.396330e-05
## CVcalibration                 1.396330e-05
## cvequality                    1.396330e-05
## cvq2                          1.396330e-05
## CVTuningCov                   1.396330e-05
## cycloids                      1.396330e-05
## DAAGxtras                     1.396330e-05
## DACF                          1.396330e-05
## dagR                          1.396330e-05
## DALY                          1.396330e-05
## dam                           1.396330e-05
## Dark                          1.396330e-05
## darts                         1.396330e-05
## Dasst                         1.396330e-05
## dataframes2xls                1.396330e-05
## dataQualityR                  1.396330e-05
## datasauRus                    1.396330e-05
## dataseries                    1.396330e-05
## datetime                      1.396330e-05
## datetimeutils                 1.396330e-05
## Davies                        1.396330e-05
## dblcens                       1.396330e-05
## DCG                           1.396330e-05
## dChipIO                       1.396330e-05
## DDM                           1.396330e-05
## deal                          1.396330e-05
## deamer                        1.396330e-05
## DECIDE                        1.396330e-05
## decision                      1.396330e-05
## decode                        1.396330e-05
## deconvolveR                   1.396330e-05
## default                       1.396330e-05
## deformula                     1.396330e-05
## degenes                       1.396330e-05
## Delaporte                     1.396330e-05
## Delta                         1.396330e-05
## DEMEtics                      1.396330e-05
## demogR                        1.396330e-05
## demoKde                       1.396330e-05
## dendsort                      1.396330e-05
## denoiSeq                      1.396330e-05
## dequer                        1.396330e-05
## DES                           1.396330e-05
## describer                     1.396330e-05
## designGG                      1.396330e-05
## designGLMM                    1.396330e-05
## desirability                  1.396330e-05
## detpack                       1.396330e-05
## devRate                       1.396330e-05
## dfCompare                     1.396330e-05
## diaplt                        1.396330e-05
## dicionariosIBGE               1.396330e-05
## diffMeshGP                    1.396330e-05
## diffractometry                1.396330e-05
## digitalPCR                    1.396330e-05
## dinamic                       1.396330e-05
## DIRECT                        1.396330e-05
## DirectStandardisation         1.396330e-05
## Disake                        1.396330e-05
## DiscreteLaplace               1.396330e-05
## discreteMTP                   1.396330e-05
## DiscriMiner                   1.396330e-05
## displayHTS                    1.396330e-05
## dispmod                       1.396330e-05
## disposables                   1.396330e-05
## dissUtils                     1.396330e-05
## distdrawr                     1.396330e-05
## distfree.cr                   1.396330e-05
## DiversitySampler              1.396330e-05
## dkDNA                         1.396330e-05
## dna                           1.396330e-05
## DNAseqtest                    1.396330e-05
## DnE                           1.396330e-05
## dobson                        1.396330e-05
## docopulae                     1.396330e-05
## documair                      1.396330e-05
## Dodge                         1.396330e-05
## DoEstRare                     1.396330e-05
## domino                        1.396330e-05
## dostats                       1.396330e-05
## dotenv                        1.396330e-05
## doubcens                      1.396330e-05
## DOvalidation                  1.396330e-05
## dpglasso                      1.396330e-05
## dplRCon                       1.396330e-05
## dprint                        1.396330e-05
## drat                          1.396330e-05
## drawExpression                1.396330e-05
## drm                           1.396330e-05
## drmdel                        1.396330e-05
## ds                            1.396330e-05
## dst                           1.396330e-05
## dtangle                       1.396330e-05
## DTDA                          1.396330e-05
## DTMCPack                      1.396330e-05
## DTRreg                        1.396330e-05
## dub                           1.396330e-05
## Dykstra                       1.396330e-05
## DYM                           1.396330e-05
## DynamicDistribution           1.396330e-05
## dynaTree                      1.396330e-05
## DynClust                      1.396330e-05
## dynia                         1.396330e-05
## DZEXPM                        1.396330e-05
## easyAHP                       1.396330e-05
## easynls                       1.396330e-05
## easySVG                       1.396330e-05
## ebal                          1.396330e-05
## EBASS                         1.396330e-05
## EBEN                          1.396330e-05
## ebGenotyping                  1.396330e-05
## EBglmnet                      1.396330e-05
## EBrank                        1.396330e-05
## ebSNP                         1.396330e-05
## Ecohydmod                     1.396330e-05
## EcoIndR                       1.396330e-05
## EconDemand                    1.396330e-05
## ecoreg                        1.396330e-05
## ecotoxicology                 1.396330e-05
## edci                          1.396330e-05
## edesign                       1.396330e-05
## edf                           1.396330e-05
## edfReader                     1.396330e-05
## edfun                         1.396330e-05
## edgeCorr                      1.396330e-05
## EffectTreat                   1.396330e-05
## EfficientMaxEigenpair         1.396330e-05
## efflog                        1.396330e-05
## eigeninv                      1.396330e-05
## eigenmodel                    1.396330e-05
## eigenprcomp                   1.396330e-05
## EL                            1.396330e-05
## elections                     1.396330e-05
## ElemStatLearn                 1.396330e-05
## elexr                         1.396330e-05
## elliplot                      1.396330e-05
## ELMR                          1.396330e-05
## EMMLi                         1.396330e-05
## emov                          1.396330e-05
## emplik2                       1.396330e-05
## ems                           1.396330e-05
## EMVC                          1.396330e-05
## endogMNP                      1.396330e-05
## endtoend                      1.396330e-05
## enrichvs                      1.396330e-05
## ensemblepp                    1.396330e-05
## EntropyExplorer               1.396330e-05
## envDocument                   1.396330e-05
## epandist                      1.396330e-05
## epanet2toolkit                1.396330e-05
## epanetReader                  1.396330e-05
## epibasix                      1.396330e-05
## EpiContactTrace               1.396330e-05
## EpiWeek                       1.396330e-05
## Eplot                         1.396330e-05
## ercv                          1.396330e-05
## ergmharris                    1.396330e-05
## errorizer                     1.396330e-05
## errors                        1.396330e-05
## ES                            1.396330e-05
## ESG                           1.396330e-05
## estout                        1.396330e-05
## EstSimPDMP                    1.396330e-05
## etma                          1.396330e-05
## europop                       1.396330e-05
## EvaluationMeasures            1.396330e-05
## EvCombR                       1.396330e-05
## evdbayes                      1.396330e-05
## eVenn                         1.396330e-05
## events                        1.396330e-05
## EvoRAG                        1.396330e-05
## EW                            1.396330e-05
## ExactCIdiff                   1.396330e-05
## exactLoglinTest               1.396330e-05
## exactmeta                     1.396330e-05
## ExcessMass                    1.396330e-05
## ExpDes                        1.396330e-05
## ExpDes.pt                     1.396330e-05
## expert                        1.396330e-05
## ExpRep                        1.396330e-05
## exptest                       1.396330e-05
## exteriorMatch                 1.396330e-05
## extlasso                      1.396330e-05
## extraBinomial                 1.396330e-05
## extremefit                    1.396330e-05
## extWeibQuant                  1.396330e-05
## eyetracking                   1.396330e-05
## ezglm                         1.396330e-05
## fabCI                         1.396330e-05
## FactorsR                      1.396330e-05
## FACTscorer                    1.396330e-05
## Fahrmeir                      1.396330e-05
## faisalconjoint                1.396330e-05
## falcon                        1.396330e-05
## falconx                       1.396330e-05
## fancycut                      1.396330e-05
## fansi                         1.396330e-05
## farsi                         1.396330e-05
## FASeg                         1.396330e-05
## fastGraph                     1.396330e-05
## fastpseudo                    1.396330e-05
## fastSOM                       1.396330e-05
## favnums                       1.396330e-05
## FBN                           1.396330e-05
## fclust                        1.396330e-05
## fcros                         1.396330e-05
## fdakma                        1.396330e-05
## fdrci                         1.396330e-05
## FDRsampsize                   1.396330e-05
## fdth                          1.396330e-05
## featurizer                    1.396330e-05
## fechner                       1.396330e-05
## fermicatsR                    1.396330e-05
## FField                        1.396330e-05
## ffmanova                      1.396330e-05
## fgac                          1.396330e-05
## FGalgorithm                   1.396330e-05
## fgpt                          1.396330e-05
## FGSG                          1.396330e-05
## FHDI                          1.396330e-05
## FI                            1.396330e-05
## fiftystater                   1.396330e-05
## filelock                      1.396330e-05
## files                         1.396330e-05
## FinAna                        1.396330e-05
## financial                     1.396330e-05
## FinancialMath                 1.396330e-05
## FinAsym                       1.396330e-05
## FindAllRoots                  1.396330e-05
## FinePop                       1.396330e-05
## fishdata                      1.396330e-05
## fishkirkko2015                1.396330e-05
## fitdc                         1.396330e-05
## fitDRC                        1.396330e-05
## fitTetra                      1.396330e-05
## fivethirtyeight               1.396330e-05
## fixedTimeEvents               1.396330e-05
## FixSeqMTP                     1.396330e-05
## fizzbuzzR                     1.396330e-05
## FlexDir                       1.396330e-05
## flipscores                    1.396330e-05
## float                         1.396330e-05
## flower                        1.396330e-05
## flowfield                     1.396330e-05
## Flury                         1.396330e-05
## fluxweb                       1.396330e-05
## FMP                           1.396330e-05
## fmt                           1.396330e-05
## foba                          1.396330e-05
## fontcm                        1.396330e-05
## ForIT                         1.396330e-05
## FormalSeries                  1.396330e-05
## forwards                      1.396330e-05
## FourScores                    1.396330e-05
## fpest                         1.396330e-05
## fpow                          1.396330e-05
## fptdApprox                    1.396330e-05
## FractalParameterEstimation    1.396330e-05
## Fragman                       1.396330e-05
## frbs                          1.396330e-05
## freeknotsplines               1.396330e-05
## FREQ                          1.396330e-05
## freqdist                      1.396330e-05
## freqMAP                       1.396330e-05
## frm                           1.396330e-05
## frmhet                        1.396330e-05
## frmpd                         1.396330e-05
## frt                           1.396330e-05
## FSAdata                       1.396330e-05
## fsia                          1.396330e-05
## fsthet                        1.396330e-05
## ftnonpar                      1.396330e-05
## fueleconomy                   1.396330e-05
## fun                           1.396330e-05
## functools                     1.396330e-05
## funr                          1.396330e-05
## FUNTA                         1.396330e-05
## FusionLearn                   1.396330e-05
## futility                      1.396330e-05
## fuzzyFDR                      1.396330e-05
## FuzzyStatTra                  1.396330e-05
## FuzzyToolkitUoN               1.396330e-05
## fwdmsa                        1.396330e-05
## fwi.fbp                       1.396330e-05
## GaDiFPT                       1.396330e-05
## gafit                         1.396330e-05
## gains                         1.396330e-05
## GAIPE                         1.396330e-05
## gamair                        1.396330e-05
## Gammareg                      1.396330e-05
## gaoptim                       1.396330e-05
## gap.datasets                  1.396330e-05
## gatepoints                    1.396330e-05
## gaussDiff                     1.396330e-05
## gaussfacts                    1.396330e-05
## GCAI.bias                     1.396330e-05
## gCat                          1.396330e-05
## gconcord                      1.396330e-05
## GDAdata                       1.396330e-05
## g.data                        1.396330e-05
## gdmp                          1.396330e-05
## gds                           1.396330e-05
## gelnet                        1.396330e-05
## gendata                       1.396330e-05
## gendist                       1.396330e-05
## GeneF                         1.396330e-05
## geneListPie                   1.396330e-05
## genepi                        1.396330e-05
## generator                     1.396330e-05
## GeneticSubsetter              1.396330e-05
## genMOSSplus                   1.396330e-05
## gensemble                     1.396330e-05
## genSurv                       1.396330e-05
## GeoBoxplot                    1.396330e-05
## geotech                       1.396330e-05
## geotools                      1.396330e-05
## gesca                         1.396330e-05
## gettz                         1.396330e-05
## GFA                           1.396330e-05
## gglasso                       1.396330e-05
## ggplot2movies                 1.396330e-05
## ggversa                       1.396330e-05
## gibbs.met                     1.396330e-05
## GiniWegNeg                    1.396330e-05
## gIPFrm                        1.396330e-05
## giRaph                        1.396330e-05
## GK2011                        1.396330e-05
## glba                          1.396330e-05
## gldrm                         1.396330e-05
## gllm                          1.396330e-05
## glmdm                         1.396330e-05
## glmlep                        1.396330e-05
## globalGSA                     1.396330e-05
## globe                         1.396330e-05
## gLRTH                         1.396330e-05
## GMAC                          1.396330e-05
## gmfd                          1.396330e-05
## gnmf                          1.396330e-05
## gnorm                         1.396330e-05
## gof                           1.396330e-05
## gomms                         1.396330e-05
## govStatJPN                    1.396330e-05
## GPB                           1.396330e-05
## gPCA                          1.396330e-05
## gPdtest                       1.396330e-05
## gpk                           1.396330e-05
## gpr                           1.396330e-05
## GPseq                         1.396330e-05
## gradDescent                   1.396330e-05
## grade                         1.396330e-05
## gramEvol                      1.396330e-05
## GRAPE                         1.396330e-05
## GrapheR                       1.396330e-05
## grex                          1.396330e-05
## grofit                        1.396330e-05
## groupRemMap                   1.396330e-05
## GroupSeq                      1.396330e-05
## groupsubsetselection          1.396330e-05
## GroupTest                     1.396330e-05
## growthmodels                  1.396330e-05
## GRS.test                      1.396330e-05
## gsalib                        1.396330e-05
## GSAQ                          1.396330e-05
## gSeg                          1.396330e-05
## gsloid                        1.396330e-05
## gsmoothr                      1.396330e-05
## gt4ireval                     1.396330e-05
## gtcorr                        1.396330e-05
## gtWAS                         1.396330e-05
## Guerry                        1.396330e-05
## gumbel                        1.396330e-05
## GWASExactHW                   1.396330e-05
## GWG                           1.396330e-05
## gwrpvr                        1.396330e-05
## GWsignif                      1.396330e-05
## hail                          1.396330e-05
## Hankel                        1.396330e-05
## hapassoc                      1.396330e-05
## HAPim                         1.396330e-05
## haplotyper                    1.396330e-05
## HarmonicRegression            1.396330e-05
## hashFunction                  1.396330e-05
## hashids                       1.396330e-05
## hashr                         1.396330e-05
## hbdct                         1.396330e-05
## hbmem                         1.396330e-05
## hcc                           1.396330e-05
## hcci                          1.396330e-05
## hcp                           1.396330e-05
## HDDesign                      1.396330e-05
## hdeco                         1.396330e-05
## HDGLM                         1.396330e-05
## HDtweedie                     1.396330e-05
## HEAT                          1.396330e-05
## heatex                        1.396330e-05
## heatmapFit                    1.396330e-05
## heavy                         1.396330e-05
## hflights                      1.396330e-05
## HGNChelper                    1.396330e-05
## HiCseg                        1.396330e-05
## hiddenf                       1.396330e-05
## HiDimDA                       1.396330e-05
## hierband                      1.396330e-05
## hierDiversity                 1.396330e-05
## hierNet                       1.396330e-05
## hiertest                      1.396330e-05
## highlightHTML                 1.396330e-05
## highTtest                     1.396330e-05
## hillmakeR                     1.396330e-05
## HiLMM                         1.396330e-05
## hindexcalculator              1.396330e-05
## hint                          1.396330e-05
## histmdl                       1.396330e-05
## historydata                   1.396330e-05
## HIV.LifeTables                1.396330e-05
## HK80                          1.396330e-05
## HMMCont                       1.396330e-05
## hmm.discnp                    1.396330e-05
## HMMpa                         1.396330e-05
## HMR                           1.396330e-05
## holdem                        1.396330e-05
## homeR                         1.396330e-05
## Homeric                       1.396330e-05
## homtest                       1.396330e-05
## hopbyhop                      1.396330e-05
## hornpa                        1.396330e-05
## hotspot                       1.396330e-05
## housingData                   1.396330e-05
## howmany                       1.396330e-05
## hqmisc                        1.396330e-05
## hqreg                         1.396330e-05
## HSAUR                         1.396330e-05
## HSAUR3                        1.396330e-05
## hsicCCA                       1.396330e-05
## hsm                           1.396330e-05
## htm2txt                       1.396330e-05
## htree                         1.396330e-05
## humidity                      1.396330e-05
## hurdlr                        1.396330e-05
## hwde                          1.396330e-05
## HWEintrinsic                  1.396330e-05
## HW.pval                       1.396330e-05
## HWxtest                       1.396330e-05
## hydrogeo                      1.396330e-05
## hydrostats                    1.396330e-05
## hypergea                      1.396330e-05
## hypersampleplan               1.396330e-05
## hypothesestest                1.396330e-05
## IAbin                         1.396330e-05
## IASD                          1.396330e-05
## IATScore                      1.396330e-05
## IBDhaploRtools                1.396330e-05
## IBDLabels                     1.396330e-05
## ibelief                       1.396330e-05
## Iboot                         1.396330e-05
## IC2                           1.396330e-05
## ic50                          1.396330e-05
## ICAFF                         1.396330e-05
## icapca                        1.396330e-05
## icarus                        1.396330e-05
## ICCbin                        1.396330e-05
## ICC.Sample.Size               1.396330e-05
## icesAdvice                    1.396330e-05
## icesDatras                    1.396330e-05
## icsw                          1.396330e-05
## ICV                           1.396330e-05
## idbg                          1.396330e-05
## identity                      1.396330e-05
## IDetect                       1.396330e-05
## idr                           1.396330e-05
## IDSpatialStats                1.396330e-05
## IDTurtle                      1.396330e-05
## idx2r                         1.396330e-05
## ieeeround                     1.396330e-05
## iemisctext                    1.396330e-05
## ifctools                      1.396330e-05
## ifs                           1.396330e-05
## iGSEA                         1.396330e-05
## ig.vancouver.2014.topcolour   1.396330e-05
## IMak                          1.396330e-05
## importar                      1.396330e-05
## imputeMDR                     1.396330e-05
## iMRMC                         1.396330e-05
## IndexNumR                     1.396330e-05
## IndianTaxCalc                 1.396330e-05
## IndTestPP                     1.396330e-05
## InfDim                        1.396330e-05
## inflection                    1.396330e-05
## infra                         1.396330e-05
## injectoR                      1.396330e-05
## inlinedocs                    1.396330e-05
## insuranceData                 1.396330e-05
## IntegrateBs                   1.396330e-05
## Interact                      1.396330e-05
## interim                       1.396330e-05
## Interpol                      1.396330e-05
## interventionalDBN             1.396330e-05
## intpoint                      1.396330e-05
## intRegGOF                     1.396330e-05
## intrval                       1.396330e-05
## intubate                      1.396330e-05
## invLT                         1.396330e-05
## iosmooth                      1.396330e-05
## iqLearn                       1.396330e-05
## irace                         1.396330e-05
## ircor                         1.396330e-05
## iRepro                        1.396330e-05
## IrishDirectorates             1.396330e-05
## irtrees                       1.396330e-05
## ISBF                          1.396330e-05
## isdals                        1.396330e-05
## isingLenzMC                   1.396330e-05
## island                        1.396330e-05
## ISLR                          1.396330e-05
## isnullptr                     1.396330e-05
## isopat                        1.396330e-05
## ISR3                          1.396330e-05
## italy                         1.396330e-05
## itree                         1.396330e-05
## itsmr                         1.396330e-05
## ivbma                         1.396330e-05
## jacpop                        1.396330e-05
## JMdesign                      1.396330e-05
## jmetrik                       1.396330e-05
## jmuOutlier                    1.396330e-05
## Johnson                       1.396330e-05
## jointDiag                     1.396330e-05
## jointNmix                     1.396330e-05
## jointPm                       1.396330e-05
## JPSurv                        1.396330e-05
## JRF                           1.396330e-05
## jrvFinance                    1.396330e-05
## jtrans                        1.396330e-05
## Julia                         1.396330e-05
## jvnVaR                        1.396330e-05
## kader                         1.396330e-05
## kaphom                        1.396330e-05
## kappaSize                     1.396330e-05
## KENDL                         1.396330e-05
## KERE                          1.396330e-05
## kerndwd                       1.396330e-05
## keypress                      1.396330e-05
## kinfit                        1.396330e-05
## KMDA                          1.396330e-05
## kmlcov                        1.396330e-05
## kmodR                         1.396330e-05
## knncat                        1.396330e-05
## knnIndep                      1.396330e-05
## knotR                         1.396330e-05
## kofnGA                        1.396330e-05
## kolmim                        1.396330e-05
## kriens                        1.396330e-05
## KRLS                          1.396330e-05
## kscons                        1.396330e-05
## kselection                    1.396330e-05
## KTensorGraphs                 1.396330e-05
## ktsolve                       1.396330e-05
## kulife                        1.396330e-05
## kza                           1.396330e-05
## L1pack                        1.396330e-05
## labeledLoop                   1.396330e-05
## labstatR                      1.396330e-05
## labstats                      1.396330e-05
## laercio                       1.396330e-05
## Lambda4                       1.396330e-05
## languageR                     1.396330e-05
## largeList                     1.396330e-05
## latdiag                       1.396330e-05
## LCMCR                         1.396330e-05
## LDcorSV                       1.396330e-05
## LDtests                       1.396330e-05
## leaderCluster                 1.396330e-05
## LeafAngle                     1.396330e-05
## LeafArea                      1.396330e-05
## leafSTAR                      1.396330e-05
## LEAP                          1.396330e-05
## learNN                        1.396330e-05
## learnrbook                    1.396330e-05
## leiv                          1.396330e-05
## lexiconPT                     1.396330e-05
## LFDR.MLE                      1.396330e-05
## lhmixr                        1.396330e-05
## libamtrack                    1.396330e-05
## LiblineaR.ACF                 1.396330e-05
## librarysnapshot               1.396330e-05
## libsoc                        1.396330e-05
## lift                          1.396330e-05
## limitplot                     1.396330e-05
## linbin                        1.396330e-05
## LinCal                        1.396330e-05
## LinearRegressionMDE           1.396330e-05
## linkim                        1.396330e-05
## LIStest                       1.396330e-05
## littler                       1.396330e-05
## liureg                        1.396330e-05
## ljr                           1.396330e-05
## lm.beta                       1.396330e-05
## lmm                           1.396330e-05
## lmPerm                        1.396330e-05
## lmridge                       1.396330e-05
## lmSubsets                     1.396330e-05
## LN0SCIs                       1.396330e-05
## LncPriCNet                    1.396330e-05
## localsolver                   1.396330e-05
## Lock5Data                     1.396330e-05
## Lock5withR                    1.396330e-05
## loder                         1.396330e-05
## logconcens                    1.396330e-05
## logitchoice                   1.396330e-05
## LogitNet                      1.396330e-05
## logOfGamma                    1.396330e-05
## LogrankA                      1.396330e-05
## longCatEDA                    1.396330e-05
## longclust                     1.396330e-05
## loon                          1.396330e-05
## lorec                         1.396330e-05
## LotkasLaw                     1.396330e-05
## lpc                           1.396330e-05
## LPCM                          1.396330e-05
## LPS                           1.396330e-05
## lrequire                      1.396330e-05
## LRTH                          1.396330e-05
## lsasim                        1.396330e-05
## LSD                           1.396330e-05
## lsdv                          1.396330e-05
## lshorth                       1.396330e-05
## lspline                       1.396330e-05
## lsplsGlm                      1.396330e-05
## LSRS                          1.396330e-05
## LSTS                          1.396330e-05
## LTPDvar                       1.396330e-05
## LTR                           1.396330e-05
## ltxsparklines                 1.396330e-05
## lunar                         1.396330e-05
## lxb                           1.396330e-05
## LZeroSpikeInference           1.396330e-05
## maddison                      1.396330e-05
## madr                          1.396330e-05
## madsim                        1.396330e-05
## magicfor                      1.396330e-05
## magree                        1.396330e-05
## mail                          1.396330e-05
## makedummies                   1.396330e-05
## makeProject                   1.396330e-05
## MAMSE                         1.396330e-05
## MANCIE                        1.396330e-05
## mangoTraining                 1.396330e-05
## Mangrove                      1.396330e-05
## ManlyMix                      1.396330e-05
## ManyTests                     1.396330e-05
## Map2NCBI                      1.396330e-05
## march                         1.396330e-05
## marima                        1.396330e-05
## maRketSim                     1.396330e-05
## marl                          1.396330e-05
## marqLevAlg                    1.396330e-05
## maSAE                         1.396330e-05
## Massign                       1.396330e-05
## MASSTIMATE                    1.396330e-05
## MATA                          1.396330e-05
## matchbook                     1.396330e-05
## matconv                       1.396330e-05
## mathgraph                     1.396330e-05
## MatManlyMix                   1.396330e-05
## MATTOOLS                      1.396330e-05
## MBI                           1.396330e-05
## mbir                          1.396330e-05
## mblm                          1.396330e-05
## mBvs                          1.396330e-05
## MCAvariants                   1.396330e-05
## mcbiopi                       1.396330e-05
## mccr                          1.396330e-05
## MChtest                       1.396330e-05
## MCI                           1.396330e-05
## MConjoint                     1.396330e-05
## mcr                           1.396330e-05
## mctest                        1.396330e-05
## MCTM                          1.396330e-05
## md                            1.396330e-05
## mdatools                      1.396330e-05
## mded                          1.396330e-05
## MDimNormn                     1.396330e-05
## mdw                           1.396330e-05
## meanr                         1.396330e-05
## meanShiftR                    1.396330e-05
## MED                           1.396330e-05
## MedDietCalc                   1.396330e-05
## medicare                      1.396330e-05
## MedOr                         1.396330e-05
## mefa                          1.396330e-05
## merror                        1.396330e-05
## MetABEL                       1.396330e-05
## metaheuristicOpt              1.396330e-05
## metaLik                       1.396330e-05
## metansue                      1.396330e-05
## MetaSubtract                  1.396330e-05
## metatest                      1.396330e-05
## MetNorm                       1.396330e-05
## mewAvg                        1.396330e-05
## MF                            1.396330e-05
## MFAg                          1.396330e-05
## MFT                           1.396330e-05
## MGL                           1.396330e-05
## MGLM                          1.396330e-05
## MGRASTer                      1.396330e-05
## mgsub                         1.396330e-05
## mhde                          1.396330e-05
## mHG                           1.396330e-05
## MHTdiscrete                   1.396330e-05
## MHTmult                       1.396330e-05
## micompr                       1.396330e-05
## microbats                     1.396330e-05
## microbenchmark                1.396330e-05
## MicroMacroMultilevel          1.396330e-05
## midastouch                    1.396330e-05
## migest                        1.396330e-05
## MILC                          1.396330e-05
## MImix                         1.396330e-05
## MindOnStats                   1.396330e-05
## Miney                         1.396330e-05
## minimap                       1.396330e-05
## minimax                       1.396330e-05
## minxent                       1.396330e-05
## miRada                        1.396330e-05
## MiRSEA                        1.396330e-05
## miscor                        1.396330e-05
## mistat                        1.396330e-05
## mix                           1.396330e-05
## mixdist                       1.396330e-05
## mixEMM                        1.396330e-05
## mixor                         1.396330e-05
## mixRasch                      1.396330e-05
## mixreg                        1.396330e-05
## mixtNB                        1.396330e-05
## MixtureRegLTIC                1.396330e-05
## mize                          1.396330e-05
## MKLE                          1.396330e-05
## mkssd                         1.396330e-05
## mlbstats                      1.396330e-05
## MLCM                          1.396330e-05
## mldr.datasets                 1.396330e-05
## mle.tools                     1.396330e-05
## mlica2                        1.396330e-05
## MLML2R                        1.396330e-05
## mlmmm                         1.396330e-05
## mlPhaser                      1.396330e-05
## MLPUGS                        1.396330e-05
## mlsjunkgen                    1.396330e-05
## mmds                          1.396330e-05
## mmeln                         1.396330e-05
## mMPA                          1.396330e-05
## mmpp                          1.396330e-05
## mmtsne                        1.396330e-05
## mnormpow                      1.396330e-05
## mod09nrt                      1.396330e-05
## modehunt                      1.396330e-05
## modelwordcloud                1.396330e-05
## modes                         1.396330e-05
## modEvA                        1.396330e-05
## modifiedmk                    1.396330e-05
## modmarg                       1.396330e-05
## modygliani                    1.396330e-05
## MoLE                          1.396330e-05
## momentchi2                    1.396330e-05
## mondate                       1.396330e-05
## monoreg                       1.396330e-05
## moonsun                       1.396330e-05
## mopsocd                       1.396330e-05
## MOrder                        1.396330e-05
## morgenstemning                1.396330e-05
## MorseGen                      1.396330e-05
## MOST                          1.396330e-05
## mozzie                        1.396330e-05
## MPCI                          1.396330e-05
## mppa                          1.396330e-05
## MPsychoR                      1.396330e-05
## MPV                           1.396330e-05
## mra                           1.396330e-05
## mreg                          1.396330e-05
## mri                           1.396330e-05
## mRm                           1.396330e-05
## MRQoL                         1.396330e-05
## MRTSampleSize                 1.396330e-05
## msaFACE                       1.396330e-05
## msBP                          1.396330e-05
## MSGLasso                      1.396330e-05
## msgpack                       1.396330e-05
## msgpackR                      1.396330e-05
## ms.sev                        1.396330e-05
## mstR                          1.396330e-05
## MTDrh                         1.396330e-05
## mthapower                     1.396330e-05
## MTSYS                         1.396330e-05
## muckrock                      1.396330e-05
## MultEq                        1.396330e-05
## multfisher                    1.396330e-05
## multiband                     1.396330e-05
## MultiCNVDetect                1.396330e-05
## multifwf                      1.396330e-05
## multinbmod                    1.396330e-05
## multirich                     1.396330e-05
## MultiRNG                      1.396330e-05
## multispatialCCM               1.396330e-05
## multiwave                     1.396330e-05
## MultNonParam                  1.396330e-05
## murphydiagram                 1.396330e-05
## MUS                           1.396330e-05
## muStat                        1.396330e-05
## MVar.pt                       1.396330e-05
## MVisAGe                       1.396330e-05
## mvngGrAd                      1.396330e-05
## mvnpermute                    1.396330e-05
## mvprpb                        1.396330e-05
## mvrtn                         1.396330e-05
## mvShapiroTest                 1.396330e-05
## MVT                           1.396330e-05
## MWLasso                       1.396330e-05
## mxkssd                        1.396330e-05
## mycobacrvR                    1.396330e-05
## namedCapture                  1.396330e-05
## NameNeedle                    1.396330e-05
## namespace                     1.396330e-05
## nasaweather                   1.396330e-05
## NB                            1.396330e-05
## nbconvertR                    1.396330e-05
## NBDdirichlet                  1.396330e-05
## nCDunnett                     1.396330e-05
## ncf                           1.396330e-05
## ncg                           1.396330e-05
## neariso                       1.396330e-05
## needy                         1.396330e-05
## negenes                       1.396330e-05
## neighbr                       1.396330e-05
## nephro                        1.396330e-05
## nestedRanksTest               1.396330e-05
## NetData                       1.396330e-05
## NetWeaver                     1.396330e-05
## neural                        1.396330e-05
## neuroblastoma                 1.396330e-05
## nFCA                          1.396330e-05
## ngram                         1.396330e-05
## NHLData                       1.396330e-05
## nice                          1.396330e-05
## NISTnls                       1.396330e-05
## nlmrt                         1.396330e-05
## nlsmsn                        1.396330e-05
## nlsrk                         1.396330e-05
## nlWaldTest                    1.396330e-05
## nmaINLA                       1.396330e-05
## NMFN                          1.396330e-05
## NMI                           1.396330e-05
## nnlasso                       1.396330e-05
## noia                          1.396330e-05
## noncensus                     1.396330e-05
## nonpar                        1.396330e-05
## Nonpareil                     1.396330e-05
## nordklimdata1                 1.396330e-05
## NormExpression                1.396330e-05
## NORMT3                        1.396330e-05
## normtest                      1.396330e-05
## normwhn.test                  1.396330e-05
## nose                          1.396330e-05
## not                           1.396330e-05
## novelist                      1.396330e-05
## noweb                         1.396330e-05
## npcopTest                     1.396330e-05
## npcp                          1.396330e-05
## nplplot                       1.396330e-05
## nplr                          1.396330e-05
## npmlda                        1.396330e-05
## NPMLEcmprsk                   1.396330e-05
## NPMPM                         1.396330e-05
## npmr                          1.396330e-05
## NPMVCP                        1.396330e-05
## nppbib                        1.396330e-05
## NPS                           1.396330e-05
## NPsimex                       1.396330e-05
## npst                          1.396330e-05
## nscancor                      1.396330e-05
## NScluster                     1.396330e-05
## nsprcomp                      1.396330e-05
## numform                       1.396330e-05
## numGen                        1.396330e-05
## numOSL                        1.396330e-05
## nws                           1.396330e-05
## nzelect                       1.396330e-05
## nzpullover                    1.396330e-05
## oaqc                          1.396330e-05
## obliclus                      1.396330e-05
## OBMbpkg                       1.396330e-05
## obs.agree                     1.396330e-05
## OBsMD                         1.396330e-05
## obsSens                       1.396330e-05
## OCA                           1.396330e-05
## occ                           1.396330e-05
## odds.converter                1.396330e-05
## odr                           1.396330e-05
## Ohit                          1.396330e-05
## okcupiddata                   1.396330e-05
## omd                           1.396330e-05
## OnAge                         1.396330e-05
## onehot                        1.396330e-05
## OneR                          1.396330e-05
## OneTwoSamples                 1.396330e-05
## onion                         1.396330e-05
## OOmisc                        1.396330e-05
## OOR                           1.396330e-05
## openintro                     1.396330e-05
## OPI                           1.396330e-05
## Opportunistic                 1.396330e-05
## ops                           1.396330e-05
## OptGS                         1.396330e-05
## OptHedging                    1.396330e-05
## optifunset                    1.396330e-05
## OptimalCutpoints              1.396330e-05
## OptionPricing                 1.396330e-05
## optR                          1.396330e-05
## orclus                        1.396330e-05
## orderstats                    1.396330e-05
## ordinalNet                    1.396330e-05
## OrdMonReg                     1.396330e-05
## OrgMassSpecR                  1.396330e-05
## ORIClust                      1.396330e-05
## orientlib                     1.396330e-05
## ORMDR                         1.396330e-05
## osDesign                      1.396330e-05
## oshka                         1.396330e-05
## OTUtable                      1.396330e-05
## outbreaks                     1.396330e-05
## OxyBS                         1.396330e-05
## p2distance                    1.396330e-05
## PAactivPAL                    1.396330e-05
## PabonLasso                    1.396330e-05
## pacbpred                      1.396330e-05
## packClassic                   1.396330e-05
## Pade                          1.396330e-05
## pagenum                       1.396330e-05
## pairedCI                      1.396330e-05
## pairheatmap                   1.396330e-05
## pairwise                      1.396330e-05
## paleomorph                    1.396330e-05
## palettetown                   1.396330e-05
## palr                          1.396330e-05
## Paneldata                     1.396330e-05
## paperplanes                   1.396330e-05
## ParallelForest                1.396330e-05
## parallelize.dynamic           1.396330e-05
## ParallelPC                    1.396330e-05
## ParentOffspring               1.396330e-05
## Partiallyoverlapping          1.396330e-05
## partitionMetric               1.396330e-05
## partsm                        1.396330e-05
## password                      1.396330e-05
## patchDVI                      1.396330e-05
## pathmapping                   1.396330e-05
## pawls                         1.396330e-05
## PBIBD                         1.396330e-05
## pbm                           1.396330e-05
## pBrackets                     1.396330e-05
## pcaL1                         1.396330e-05
## pcensmix                      1.396330e-05
## PCFAM                         1.396330e-05
## pcg                           1.396330e-05
## PCIT                          1.396330e-05
## pco                           1.396330e-05
## PCSinR                        1.396330e-05
## pder                          1.396330e-05
## Peacock.test                  1.396330e-05
## peacots                       1.396330e-05
## peakRAM                       1.396330e-05
## Peaks                         1.396330e-05
## PeakSegDP                     1.396330e-05
## pear                          1.396330e-05
## pearson7                      1.396330e-05
## PearsonICA                    1.396330e-05
## PEGroupTesting                1.396330e-05
## PEMM                          1.396330e-05
## Perc                          1.396330e-05
## PeriodicTable                 1.396330e-05
## PermAlgo                      1.396330e-05
## persiandictionary             1.396330e-05
## perturb                       1.396330e-05
## pesticides                    1.396330e-05
## petitr                        1.396330e-05
## pgam                          1.396330e-05
## PGM2                          1.396330e-05
## pgmm                          1.396330e-05
## pgnorm                        1.396330e-05
## phonenumber                   1.396330e-05
## phreeqc                       1.396330e-05
## phuassess                     1.396330e-05
## phylin                        1.396330e-05
## PHYLOGR                       1.396330e-05
## physiology                    1.396330e-05
## pipeGS                        1.396330e-05
## pipeliner                     1.396330e-05
## PIPS                          1.396330e-05
## pkgKitten                     1.396330e-05
## pkmon                         1.396330e-05
## PKPDmodels                    1.396330e-05
## pKSEA                         1.396330e-05
## pla                           1.396330e-05
## plan                          1.396330e-05
## Planesmuestra                 1.396330e-05
## plantecophys                  1.396330e-05
## PlayerRatings                 1.396330e-05
## PLIS                          1.396330e-05
## pln                           1.396330e-05
## plotpc                        1.396330e-05
## PlotRegionHighlighter         1.396330e-05
## PLRModels                     1.396330e-05
## PLSbiplot1                    1.396330e-05
## plsdepot                      1.396330e-05
## plugdensity                   1.396330e-05
## pmlr                          1.396330e-05
## pmmlTransformations           1.396330e-05
## pmr                           1.396330e-05
## pnn                           1.396330e-05
## poisson                       1.396330e-05
## poisson.glm.mix               1.396330e-05
## poistweedie                   1.396330e-05
## poker                         1.396330e-05
## polyaAeppli                   1.396330e-05
## polyglot                      1.396330e-05
## PolyTrend                     1.396330e-05
## Pomic                         1.396330e-05
## pooh                          1.396330e-05
## PooledMeanGroup               1.396330e-05
## poolfstat                     1.396330e-05
## popbio                        1.396330e-05
## POPdemog                      1.396330e-05
## PopGenKit                     1.396330e-05
## PoSI                          1.396330e-05
## POT                           1.396330e-05
## potts                         1.396330e-05
## powell                        1.396330e-05
## powerAnalysis                 1.396330e-05
## PowerNormal                   1.396330e-05
## powerpkg                      1.396330e-05
## PowerUpR                      1.396330e-05
## PP3                           1.396330e-05
## ppcc                          1.396330e-05
## ppitables                     1.396330e-05
## PracTools                     1.396330e-05
## pragma                        1.396330e-05
## prais                         1.396330e-05
## praktikum                     1.396330e-05
## praznik                       1.396330e-05
## PredictiveRegression          1.396330e-05
## predmixcor                    1.396330e-05
## preference                    1.396330e-05
## primefactr                    1.396330e-05
## prinsimp                      1.396330e-05
## PrivateLR                     1.396330e-05
## pro                           1.396330e-05
## probemod                      1.396330e-05
## proccalibrad                  1.396330e-05
## profdpm                       1.396330e-05
## profilr                       1.396330e-05
## profmem                       1.396330e-05
## ProliferativeIndex            1.396330e-05
## properties                    1.396330e-05
## PropScrRand                   1.396330e-05
## ProteinDescriptors            1.396330e-05
## PROTOLIDAR                    1.396330e-05
## protr                         1.396330e-05
## pRSR                          1.396330e-05
## psoptim                       1.396330e-05
## Pstat                         1.396330e-05
## psyphy                        1.396330e-05
## PtProcess                     1.396330e-05
## ptwikiwords                   1.396330e-05
## purge                         1.396330e-05
## pwr2                          1.396330e-05
## pwrAB                         1.396330e-05
## pwrFDR                        1.396330e-05
## pwrRasch                      1.396330e-05
## pwt8                          1.396330e-05
## pwt9                          1.396330e-05
## pyramid                       1.396330e-05
## qboxplot                      1.396330e-05
## QCAfalsePositive              1.396330e-05
## QCEWAS                        1.396330e-05
## QCGWAS                        1.396330e-05
## QCSIS                         1.396330e-05
## qdm                           1.396330e-05
## QFRM                          1.396330e-05
## QICD                          1.396330e-05
## qLearn                        1.396330e-05
## QLearning                     1.396330e-05
## qmrparser                     1.396330e-05
## QQperm                        1.396330e-05
## QSARdata                      1.396330e-05
## qtlDesign                     1.396330e-05
## qtlmt                         1.396330e-05
## qualvar                       1.396330e-05
## quantileDA                    1.396330e-05
## QuantileGradeR                1.396330e-05
## QuantNorm                     1.396330e-05
## queueing                      1.396330e-05
## quotedargs                    1.396330e-05
## R1magic                       1.396330e-05
## R2DGC                         1.396330e-05
## r2stl                         1.396330e-05
## R4dfp                         1.396330e-05
## race                          1.396330e-05
## radar                         1.396330e-05
## Ramble                        1.396330e-05
## ramify                        1.396330e-05
## RAMP                          1.396330e-05
## randaes                       1.396330e-05
## randgeo                       1.396330e-05
## RandMeta                      1.396330e-05
## randomizeBE                   1.396330e-05
## rangemodelR                   1.396330e-05
## RankingProject                1.396330e-05
## RankResponse                  1.396330e-05
## RAP                           1.396330e-05
## RAppArmor                     1.396330e-05
## Rarity                        1.396330e-05
## RaschSampler                  1.396330e-05
## RateDistortion                1.396330e-05
## raters                        1.396330e-05
## ratesci                       1.396330e-05
## RAtmosphere                   1.396330e-05
## rattle.data                   1.396330e-05
## rAverage                      1.396330e-05
## raw                           1.396330e-05
## rBeta2009                     1.396330e-05
## rbvs                          1.396330e-05
## Rcapture                      1.396330e-05
## RCassandra                    1.396330e-05
## rcc                           1.396330e-05
## RcellData                     1.396330e-05
## Rcereal                       1.396330e-05
## RClone                        1.396330e-05
## rCMA                          1.396330e-05
## RConics                       1.396330e-05
## Rcpp11                        1.396330e-05
## Rcriticor                     1.396330e-05
## rcrypt                        1.396330e-05
## Rcssplot                      1.396330e-05
## rdataretriever                1.396330e-05
## rdetools                      1.396330e-05
## RDIDQ                         1.396330e-05
## RDieHarder                    1.396330e-05
## Rdistance                     1.396330e-05
## rDNAse                        1.396330e-05
## RDStreeboot                   1.396330e-05
## REAT                          1.396330e-05
## RECA                          1.396330e-05
## ReCiPa                        1.396330e-05
## Records                       1.396330e-05
## Redmonder                     1.396330e-05
## refnr                         1.396330e-05
## refset                        1.396330e-05
## RegClust                      1.396330e-05
## REGENT                        1.396330e-05
## regexPipes                    1.396330e-05
## regexr                        1.396330e-05
## RegressionFactory             1.396330e-05
## regspec                       1.396330e-05
## regsubseq                     1.396330e-05
## reinstallr                    1.396330e-05
## rel                           1.396330e-05
## rela                          1.396330e-05
## relabeLoadings                1.396330e-05
## Relatedness                   1.396330e-05
## relax                         1.396330e-05
## relen                         1.396330e-05
## Reliability                   1.396330e-05
## remMap                        1.396330e-05
## reportReg                     1.396330e-05
## represent                     1.396330e-05
## requireR                      1.396330e-05
## resample                      1.396330e-05
## resampledata                  1.396330e-05
## ResistorArray                 1.396330e-05
## RESS                          1.396330e-05
## retimes                       1.396330e-05
## reweight                      1.396330e-05
## rFerns                        1.396330e-05
## Rfmtool                       1.396330e-05
## rfordummies                   1.396330e-05
## rgabriel                      1.396330e-05
## rgcvpack                      1.396330e-05
## rgen                          1.396330e-05
## RGenetics                     1.396330e-05
## RGIFT                         1.396330e-05
## rgw                           1.396330e-05
## rhnerm                        1.396330e-05
## rhoR                          1.396330e-05
## rhosp                         1.396330e-05
## Rhpc                          1.396330e-05
## RHT                           1.396330e-05
## ri                            1.396330e-05
## Ridit                         1.396330e-05
## ridittools                    1.396330e-05
## RIFS                          1.396330e-05
## rinform                       1.396330e-05
## RInSp                         1.396330e-05
## Risk                          1.396330e-05
## riskR                         1.396330e-05
## RiverBuilder                  1.396330e-05
## rivervis                      1.396330e-05
## RJaCGH                        1.396330e-05
## RJSplot                       1.396330e-05
## RkMetrics                     1.396330e-05
## RLeafAngle                    1.396330e-05
## rLindo                        1.396330e-05
## rlm                           1.396330e-05
## RLT                           1.396330e-05
## RM2006                        1.396330e-05
## rmaf                          1.396330e-05
## RMC                           1.396330e-05
## rMEA                          1.396330e-05
## RMKdiscrete                   1.396330e-05
## rmp                           1.396330e-05
## rms.gof                       1.396330e-05
## RnavGraphImageData            1.396330e-05
## RND                           1.396330e-05
## RNentropy                     1.396330e-05
## rnetcarto                     1.396330e-05
## rngSetSeed                    1.396330e-05
## rngwell19937                  1.396330e-05
## RobAStRDA                     1.396330e-05
## robeth                        1.396330e-05
## RobRSVD                       1.396330e-05
## robumeta                      1.396330e-05
## robustETM                     1.396330e-05
## RobustRankAggreg              1.396330e-05
## rocNIT                        1.396330e-05
## ROCwoGS                       1.396330e-05
## rope                          1.396330e-05
## ROSE                          1.396330e-05
## RoughSetKnowledgeReduction    1.396330e-05
## rpca                          1.396330e-05
## RPEXE.RPEXT                   1.396330e-05
## rpgm                          1.396330e-05
## rpicosat                      1.396330e-05
## rpnf                          1.396330e-05
## Rpoppler                      1.396330e-05
## RPPairwiseDesign              1.396330e-05
## RRate                         1.396330e-05
## rrBlupMethod6                 1.396330e-05
## Rrdrand                       1.396330e-05
## rroad                         1.396330e-05
## RRPP                          1.396330e-05
## RSADBE                        1.396330e-05
## rsae                          1.396330e-05
## Rsampling                     1.396330e-05
## rSCA                          1.396330e-05
## RSclient                      1.396330e-05
## rsdepth                       1.396330e-05
## rseedcalc                     1.396330e-05
## Rserve                        1.396330e-05
## RSGHB                         1.396330e-05
## RSSOP                         1.396330e-05
## rsvd                          1.396330e-05
## RSvgDevice                    1.396330e-05
## RSVGTipsDevice                1.396330e-05
## rt3                           1.396330e-05
## rtape                         1.396330e-05
## Rtauchen                      1.396330e-05
## RTaxometrics                  1.396330e-05
## RTConnect                     1.396330e-05
## RTDE                          1.396330e-05
## RTextureMetrics               1.396330e-05
## Rtnmin                        1.396330e-05
## rtrim                         1.396330e-05
## Rtwalk                        1.396330e-05
## rtype                         1.396330e-05
## Runiversal                    1.396330e-05
## rv                            1.396330e-05
## Rwinsteps                     1.396330e-05
## sac                           1.396330e-05
## SADEG                         1.396330e-05
## saemix                        1.396330e-05
## saery                         1.396330e-05
## SAFD                          1.396330e-05
## SafeBayes                     1.396330e-05
## safi                          1.396330e-05
## sAIC                          1.396330e-05
## samon                         1.396330e-05
## samplesize                    1.396330e-05
## Sample.Size                   1.396330e-05
## SampleSize4ClinicalTrials     1.396330e-05
## samplesizeCMH                 1.396330e-05
## SampleSizeMeans               1.396330e-05
## SampleSizeProportions         1.396330e-05
## sanitizers                    1.396330e-05
## sanon                         1.396330e-05
## SAPP                          1.396330e-05
## SARP.moodle                   1.396330e-05
## SASmixed                      1.396330e-05
## SASPECT                       1.396330e-05
## saves                         1.396330e-05
## sBF                           1.396330e-05
## sbgcop                        1.396330e-05
## sbioPN                        1.396330e-05
## scar                          1.396330e-05
## SCAT                          1.396330e-05
## scenario                      1.396330e-05
## schoolmath                    1.396330e-05
## schoRsch                      1.396330e-05
## schumaker                     1.396330e-05
## scifigure                     1.396330e-05
## scio                          1.396330e-05
## ScoreGGUM                     1.396330e-05
## SCORER2                       1.396330e-05
## scoring                       1.396330e-05
## ScottKnott                    1.396330e-05
## SCperf                        1.396330e-05
## ScrabbleScore                 1.396330e-05
## scriptests                    1.396330e-05
## scriptexec                    1.396330e-05
## scuba                         1.396330e-05
## SDaA                          1.396330e-05
## sdat                          1.396330e-05
## sddpack                       1.396330e-05
## sdef                          1.396330e-05
## SDEFSR                        1.396330e-05
## sdnet                         1.396330e-05
## sdtoolkit                     1.396330e-05
## SearchTrees                   1.396330e-05
## SEAsic                        1.396330e-05
## seedy                         1.396330e-05
## SEER2R                        1.396330e-05
## seismic                       1.396330e-05
## selectapref                   1.396330e-05
## seminr                        1.396330e-05
## semPower                      1.396330e-05
## SensitivityCaseControl        1.396330e-05
## sensitivitymult               1.396330e-05
## sensitivitymw                 1.396330e-05
## SenSrivastava                 1.396330e-05
## sEparaTe                      1.396330e-05
## SeqAlloc                      1.396330e-05
## seqminer                      1.396330e-05
## seqmon                        1.396330e-05
## seqRFLP                       1.396330e-05
## seqtest                       1.396330e-05
## seroincidence                 1.396330e-05
## session                       1.396330e-05
## SETPath                       1.396330e-05
## SetTest                       1.396330e-05
## severity                      1.396330e-05
## sfinx                         1.396330e-05
## SGL                           1.396330e-05
## sgRSEA                        1.396330e-05
## shiftR                        1.396330e-05
## shinyShortcut                 1.396330e-05
## SHIP                          1.396330e-05
## ShrinkCovMat                  1.396330e-05
## shuffle                       1.396330e-05
## SiER                          1.396330e-05
## sievetest                     1.396330e-05
## sig                           1.396330e-05
## SightabilityModel             1.396330e-05
## SignifReg                     1.396330e-05
## signmedian.test               1.396330e-05
## sigora                        1.396330e-05
## SII                           1.396330e-05
## simctest                      1.396330e-05
## SimilarityMeasures            1.396330e-05
## Simile                        1.396330e-05
## SimPhe                        1.396330e-05
## simpleNeural                  1.396330e-05
## simpleSetup                   1.396330e-05
## SimSCRPiecewise               1.396330e-05
## simsurv                       1.396330e-05
## simtimer                      1.396330e-05
## SimultAnR                     1.396330e-05
## SIN                           1.396330e-05
## sinib                         1.396330e-05
## sitools                       1.396330e-05
## skda                          1.396330e-05
## skeletor                      1.396330e-05
## skellam                       1.396330e-05
## sla                           1.396330e-05
## SLDAssay                      1.396330e-05
## sleekts                       1.396330e-05
## Sleuth2                       1.396330e-05
## Sleuth3                       1.396330e-05
## SLHD                          1.396330e-05
## smac                          1.396330e-05
## SMC                           1.396330e-05
## smco                          1.396330e-05
## SMCP                          1.396330e-05
## SMCRM                         1.396330e-05
## smcUtils                      1.396330e-05
## smdata                        1.396330e-05
## smfsb                         1.396330e-05
## SMIR                          1.396330e-05
## smirnov                       1.396330e-05
## SmithWilsonYieldCurve         1.396330e-05
## SMLoutliers                   1.396330e-05
## smss                          1.396330e-05
## snappier                      1.396330e-05
## snapshot                      1.396330e-05
## snn                           1.396330e-05
## snnR                          1.396330e-05
## snowflakes                    1.396330e-05
## snpar                         1.396330e-05
## snpRF                         1.396330e-05
## SOAR                          1.396330e-05
## SocialPosition                1.396330e-05
## SoftClustering                1.396330e-05
## softmaxreg                    1.396330e-05
## SoilHyP                       1.396330e-05
## soilwater                     1.396330e-05
## solarPos                      1.396330e-05
## SOLOMON                       1.396330e-05
## somebm                        1.396330e-05
## someKfwer                     1.396330e-05
## sonar                         1.396330e-05
## sonicLength                   1.396330e-05
## soobench                      1.396330e-05
## soql                          1.396330e-05
## SorptionAnalysis              1.396330e-05
## sotu                          1.396330e-05
## sound                         1.396330e-05
## SPA3G                         1.396330e-05
## spaa                          1.396330e-05
## space                         1.396330e-05
## SpadeR                        1.396330e-05
## spaero                        1.396330e-05
## spam64                        1.396330e-05
## SPAr                          1.396330e-05
## sparc                         1.396330e-05
## SparkR                        1.396330e-05
## sparktex                      1.396330e-05
## SparseDC                      1.396330e-05
## sparseEigen                   1.396330e-05
## sparseSEM                     1.396330e-05
## sparseSVM                     1.396330e-05
## SPAtest                       1.396330e-05
## SpatialAcc                    1.396330e-05
## spcadjust                     1.396330e-05
## spcov                         1.396330e-05
## spcr                          1.396330e-05
## spdownscale                   1.396330e-05
## spe                           1.396330e-05
## speccalt                      1.396330e-05
## SPECIES                       1.396330e-05
## spectralGP                    1.396330e-05
## SPEDInstabR                   1.396330e-05
## SphericalK                    1.396330e-05
## spi                           1.396330e-05
## SPIAssay                      1.396330e-05
## SPINA                         1.396330e-05
## spinyReg                      1.396330e-05
## splot                         1.396330e-05
## spMC                          1.396330e-05
## sporm                         1.396330e-05
## SportsAnalytics               1.396330e-05
## sprsmdl                       1.396330e-05
## SPRT                          1.396330e-05
## spt                           1.396330e-05
## SPYvsSPY                      1.396330e-05
## sra                           1.396330e-05
## SRCS                          1.396330e-05
## ssd                           1.396330e-05
## SSLASSO                       1.396330e-05
## SSM                           1.396330e-05
## sspline                       1.396330e-05
## ssvd                          1.396330e-05
## stackoverflow                 1.396330e-05
## StakeholderAnalysis           1.396330e-05
## StandardizeText               1.396330e-05
## staplr                        1.396330e-05
## startup                       1.396330e-05
## Stat2Data                     1.396330e-05
## StatPerMeCo                   1.396330e-05
## statprograms                  1.396330e-05
## stcov                         1.396330e-05
## stddiff                       1.396330e-05
## SteinIV                       1.396330e-05
## stellaR                       1.396330e-05
## stepPlr                       1.396330e-05
## stepwise                      1.396330e-05
## stheoreme                     1.396330e-05
## sticky                        1.396330e-05
## StockChina                    1.396330e-05
## STPGA                         1.396330e-05
## StrainRanking                 1.396330e-05
## straweib                      1.396330e-05
## StressStrength                1.396330e-05
## stsm.class                    1.396330e-05
## STV                           1.396330e-05
## subcopem2D                    1.396330e-05
## SubCultCon                    1.396330e-05
## subdetect                     1.396330e-05
## subgroup                      1.396330e-05
## subgroup.discovery            1.396330e-05
## subrank                       1.396330e-05
## subsamp                       1.396330e-05
## sudoku                        1.396330e-05
## SUE                           1.396330e-05
## SunterSampling                1.396330e-05
## SuperExactTest                1.396330e-05
## superMDS                      1.396330e-05
## supernova                     1.396330e-05
## support.BWS                   1.396330e-05
## support.BWS2                  1.396330e-05
## suRtex                        1.396330e-05
## surveyeditor                  1.396330e-05
## surveyoutliers                1.396330e-05
## SurvLong                      1.396330e-05
## survPresmooth                 1.396330e-05
## svenssonm                     1.396330e-05
## swagger                       1.396330e-05
## swCRTdesign                   1.396330e-05
## SwissAir                      1.396330e-05
## sylcount                      1.396330e-05
## SymTS                         1.396330e-05
## synbreedData                  1.396330e-05
## synchrony                     1.396330e-05
## SyncMove                      1.396330e-05
## SyncRNG                       1.396330e-05
## T2EQ                          1.396330e-05
## TableToLongForm               1.396330e-05
## TaoTeProgramming              1.396330e-05
## TauP.R                        1.396330e-05
## tbdiag                        1.396330e-05
## TDAmapper                     1.396330e-05
## tdthap                        1.396330e-05
## TeachNet                      1.396330e-05
## teamcolors                    1.396330e-05
## teda                          1.396330e-05
## TEEReg                        1.396330e-05
## tempcyclesdata                1.396330e-05
## tempdisagg                    1.396330e-05
## tempR                         1.396330e-05
## tensr                         1.396330e-05
## TEQR                          1.396330e-05
## TERAplusB                     1.396330e-05
## Ternary                       1.396330e-05
## testassay                     1.396330e-05
## TestFunctions                 1.396330e-05
## TestScorer                    1.396330e-05
## textgRid                      1.396330e-05
## textile                       1.396330e-05
## textometry                    1.396330e-05
## tfer                          1.396330e-05
## tgcd                          1.396330e-05
## thankr                        1.396330e-05
## ThermIndex                    1.396330e-05
## thermocouple                  1.396330e-05
## thgenetics                    1.396330e-05
## ThreeGroups                   1.396330e-05
## TickExec                      1.396330e-05
## TiddlyWikiR                   1.396330e-05
## TideHarmonics                 1.396330e-05
## TimeMachine                   1.396330e-05
## timetools                     1.396330e-05
## timsac                        1.396330e-05
## Tinflex                       1.396330e-05
## tinsel                        1.396330e-05
## tipom                         1.396330e-05
## TITAN2                        1.396330e-05
## titrationCurves               1.396330e-05
## tkRplotR                      1.396330e-05
## tlemix                        1.396330e-05
## tmcn                          1.396330e-05
## tmvnsim                       1.396330e-05
## TNC                           1.396330e-05
## topsis                        1.396330e-05
## TotalCopheneticIndex          1.396330e-05
## toxtestD                      1.396330e-05
## tpe                           1.396330e-05
## TP.idm                        1.396330e-05
## track                         1.396330e-05
## TRAMPR                        1.396330e-05
## translation.ko                1.396330e-05
## TransP                        1.396330e-05
## treelet                       1.396330e-05
## treeperm                      1.396330e-05
## TrialSize                     1.396330e-05
## triangulation                 1.396330e-05
## trifield                      1.396330e-05
## trimr                         1.396330e-05
## TrioSGL                       1.396330e-05
## tropAlgebra                   1.396330e-05
## trotter                       1.396330e-05
## trueskill                     1.396330e-05
## tsallisqexp                   1.396330e-05
## tsc                           1.396330e-05
## TSdata                        1.396330e-05
## tsdecomp                      1.396330e-05
## tsdisagg2                     1.396330e-05
## TSeriesMMA                    1.396330e-05
## TSHRC                         1.396330e-05
## TSMN                          1.396330e-05
## ttbbeer                       1.396330e-05
## tth                           1.396330e-05
## tttplot                       1.396330e-05
## tuckerR.mmgg                  1.396330e-05
## TUWmodel                      1.396330e-05
## twiddler                      1.396330e-05
## TwoCop                        1.396330e-05
## twoStageGwasPower             1.396330e-05
## types                         1.396330e-05
## UBCRM                         1.396330e-05
## UCR.ColumnNames               1.396330e-05
## UdderQuarterInfectionData     1.396330e-05
## ukbabynames                   1.396330e-05
## ump                           1.396330e-05
## Umpire                        1.396330e-05
## unbalhaar                     1.396330e-05
## uncmbb                        1.396330e-05
## Unicode                       1.396330e-05
## uniqtag                       1.396330e-05
## unittest                      1.396330e-05
## UnivRNG                       1.396330e-05
## unix                          1.396330e-05
## unrepx                        1.396330e-05
## unvotes                       1.396330e-05
## uroot                         1.396330e-05
## USAboundaries                 1.396330e-05
## USCF                          1.396330e-05
## usedist                       1.396330e-05
## usmap                         1.396330e-05
## UStatBookABSC                 1.396330e-05
## utf8latex                     1.396330e-05
## vaersNDvax                    1.396330e-05
## vaersvax                      1.396330e-05
## valottery                     1.396330e-05
## vardiag                       1.396330e-05
## VarED                         1.396330e-05
## VaRES                         1.396330e-05
## VAR.etp                       1.396330e-05
## varhandle                     1.396330e-05
## VARSEDIG                      1.396330e-05
## varSel                        1.396330e-05
## VarSwapPrice                  1.396330e-05
## vbdm                          1.396330e-05
## vbsr                          1.396330e-05
## vcov                          1.396330e-05
## Vdgraph                       1.396330e-05
## VDSPCalibration               1.396330e-05
## vecsets                       1.396330e-05
## vegetarian                    1.396330e-05
## vetr                          1.396330e-05
## VGAMdata                      1.396330e-05
## vhica                         1.396330e-05
## vietnamcode                   1.396330e-05
## VIF                           1.396330e-05
## VIFCP                         1.396330e-05
## VIGoR                         1.396330e-05
## viopoints                     1.396330e-05
## visualize                     1.396330e-05
## vitality                      1.396330e-05
## VLF                           1.396330e-05
## vocaldia                      1.396330e-05
## vowels                        1.396330e-05
## VoxR                          1.396330e-05
## vrmlgen                       1.396330e-05
## vrtest                        1.396330e-05
## vtreat                        1.396330e-05
## vudc                          1.396330e-05
## wahc                          1.396330e-05
## walkscoreAPI                  1.396330e-05
## washdata                      1.396330e-05
## waved                         1.396330e-05
## wavefunction                  1.396330e-05
## WaveletComp                   1.396330e-05
## wbs                           1.396330e-05
## WCQ                           1.396330e-05
## webp                          1.396330e-05
## websearchr                    1.396330e-05
## webvis                        1.396330e-05
## weco                          1.396330e-05
## Weighted.Desc.Stat            1.396330e-05
## WeightedPortTest              1.396330e-05
## weirs                         1.396330e-05
## WhopGenome                    1.396330e-05
## wildpoker                     1.396330e-05
## wktmo                         1.396330e-05
## WMDB                          1.396330e-05
## wNNSel                        1.396330e-05
## woe                           1.396330e-05
## wooldridge                    1.396330e-05
## WordPools                     1.396330e-05
## wPerm                         1.396330e-05
## WPKDE                         1.396330e-05
## wpp2008                       1.396330e-05
## wpp2010                       1.396330e-05
## write.snns                    1.396330e-05
## wtest                         1.396330e-05
## wvtool                        1.396330e-05
## WWGbook                       1.396330e-05
## xgobi                         1.396330e-05
## XHWE                          1.396330e-05
## XiMpLe                        1.396330e-05
## xlsimple                      1.396330e-05
## Xmisc                         1.396330e-05
## xmlparsedata                  1.396330e-05
## XNomial                       1.396330e-05
## xptr                          1.396330e-05
## XRSCC                         1.396330e-05
## xtal                          1.396330e-05
## xyloplot                      1.396330e-05
## yasp                          1.396330e-05
## YPmodel                       1.396330e-05
## zipcode                       1.396330e-05
## zoeppritz                     1.396330e-05
## zscorer                       1.396330e-05

–Build dependency graph of top packages–

set.seed(42)
pr2 %>%
  head(25) %>%
  rownames %>%
  makeDepGraph(pdb) %>%
  plot(main="Top packages by page rank", cex=0.5)