diff --git a/R/.RData b/R/.RData index d17abb1..95d1f26 100644 Binary files a/R/.RData and b/R/.RData differ diff --git a/R/.Rhistory b/R/.Rhistory index c51bcfc..18bfad0 100644 --- a/R/.Rhistory +++ b/R/.Rhistory @@ -1,330 +1,450 @@ -theme_bw() -test_glmer_ranef_D |> -ggplot(aes(x=rank, y=estimate, col = as.factor(ranef_grouping))) + -geom_linerange(aes(ymin= conf.low, ymax= conf.high)) + -theme_bw() -summary(all_gmodel) -all_gmodel <- glmer(count ~ D * I(week_offset)+ scaled_project_age + (D * I(week_offset)| upstream_vcs_link), data=all_actions_data) -summary(all_gmodel) -test_condvals <- broom.mixed::tidy(all_gmodel, effects = "ran_vals", conf.int = TRUE) -test_glmer_ranef_D <- test_condvals [which(test_condvals $term == "D"),] -has_zero <- function(estimate, low, high){ -return(ifelse((low < 0),ifelse((high > 0), 1, 0), 2)) -} -test_glmer_ranef_D <- test_glmer_ranef_D |> -mutate(ranef_grouping = has_zero(estimate, conf.low, conf.high)) |> -mutate(rank = rank(estimate)) -test_glmer_ranef_D |> -ggplot(aes(x=rank, y=estimate, col = as.factor(ranef_grouping))) + -geom_linerange(aes(ymin= conf.low, ymax= conf.high)) + -theme_bw() -View(test_glmer_ranef_D) -View(test_condvals) -all_gmodel <- glmer(count ~ D * I(week_offset)+ scaled_project_age + (D * I(week_offset)| upstream_vcs_link), data=all_actions_data) -summary(all_gmodel) -test_condvals <- broom.mixed::tidy(all_gmodel, effects = "ran_vals", conf.int = TRUE) -View(test_condvals) -all_gmodel <- glmer(count ~ D * I(week_offset)+ scaled_project_age + (D * I(week_offset)| upstream_vcs_link), data=all_actions_data, family = Poisson) -all_gmodel <- glmer(count ~ D * I(week_offset)+ scaled_project_age + (D * I(week_offset)| upstream_vcs_link), data=all_actions_data, family = poisson) -summary(all_gmodel) -all_gmodel <- glmer(count ~ D * I(week_offset)+ scaled_project_age + (D | upstream_vcs_link), data=all_actions_data, family = poisson) -summary(all_gmodel) -test_condvals <- broom.mixed::tidy(all_gmodel, effects = "ran_vals", conf.int = TRUE) -test_glmer_ranef_D <- test_condvals [which(test_condvals $term == "D"),] -has_zero <- function(estimate, low, high){ -return(ifelse((low < 0),ifelse((high > 0), 1, 0), 2)) -} -test_glmer_ranef_D <- test_glmer_ranef_D |> -mutate(ranef_grouping = has_zero(estimate, conf.low, conf.high)) |> -mutate(rank = rank(estimate)) -test_glmer_ranef_D |> -ggplot(aes(x=rank, y=estimate, col = as.factor(ranef_grouping))) + -geom_linerange(aes(ymin= conf.low, ymax= conf.high)) + -theme_bw() -all_gmodel <- glmer(count ~ D * I(week_offset)+ scaled_project_age + (D * I(week_offset)| upstream_vcs_link), data=all_actions_data, family = poisson) -all_gmodel <- glmer(count ~ D * I(week_offset)+ scaled_project_age + (D * I(week_offset)| upstream_vcs_link), data=all_actions_data, nAGQ=0, family = poisson) -summary(all_gmodel) -test_condvals <- broom.mixed::tidy(all_gmodel, effects = "ran_vals", conf.int = TRUE) -test_glmer_ranef_D <- test_condvals [which(test_condvals $term == "D"),] -has_zero <- function(estimate, low, high){ -return(ifelse((low < 0),ifelse((high > 0), 1, 0), 2)) -} -test_glmer_ranef_D <- test_glmer_ranef_D |> -mutate(ranef_grouping = has_zero(estimate, conf.low, conf.high)) |> -mutate(rank = rank(estimate)) -test_glmer_ranef_D |> -ggplot(aes(x=rank, y=estimate, col = as.factor(ranef_grouping))) + -geom_linerange(aes(ymin= conf.low, ymax= conf.high)) + -theme_bw() -variance(all_actions_data$log1p_count) -var(all_actions_data$log1p_count) -mean (all_actions_data$log1p_count) -#all_gmodel <- glmer(count ~ D * I(week_offset)+ scaled_project_age + (D * I(week_offset)| upstream_vcs_link), data=all_actions_data, nAGQ=0, family = poisson) -all_gmodel <- glmer.nb(count ~ D * I(week_offset)+ scaled_project_age + (D * I(week_offset)| upstream_vcs_link),data=all_actions_data) -#all_gmodel <- glmer(count ~ D * I(week_offset)+ scaled_project_age + (D * I(week_offset)| upstream_vcs_link), data=all_actions_data, nAGQ=0, family = poisson) -all_gmodel <- glmer.nb(count ~ D * I(week_offset)+ scaled_project_age + (D * I(week_offset)| upstream_vcs_link), -control=glmerControl(optimizer="bobyqa", -optCtrl=list(maxfun=2e5)), data=all_actions_data) -#all_gmodel <- glmer(count ~ D * I(week_offset)+ scaled_project_age + (D * I(week_offset)| upstream_vcs_link), data=all_actions_data, nAGQ=0, family = poisson) -all_gmodel <- glmer.nb(count ~ D * I(week_offset)+ scaled_project_age + (D | upstream_vcs_link), -control=glmerControl(optimizer="bobyqa", -optCtrl=list(maxfun=2e5)), data=all_actions_data) -summary(all_gmodel) -test_condvals <- broom.mixed::tidy(all_gmodel, effects = "ran_vals", conf.int = TRUE) -test_glmer_ranef_D <- test_condvals [which(test_condvals $term == "D"),] -has_zero <- function(estimate, low, high){ -return(ifelse((low < 0),ifelse((high > 0), 1, 0), 2)) -} -test_glmer_ranef_D <- test_glmer_ranef_D |> -mutate(ranef_grouping = has_zero(estimate, conf.low, conf.high)) |> -mutate(rank = rank(estimate)) -test_glmer_ranef_D |> -ggplot(aes(x=rank, y=estimate, col = as.factor(ranef_grouping))) + -geom_linerange(aes(ymin= conf.low, ymax= conf.high)) + -theme_bw() -#all_gmodel <- glmer(count ~ D * I(week_offset)+ scaled_project_age + (D * I(week_offset)| upstream_vcs_link), data=all_actions_data, nAGQ=0, family = poisson) -#all_gmodel <- glmer.nb(count ~ D * I(week_offset)+ scaled_project_age + (D * I(week_offset) | upstream_vcs_link), -# control=glmerControl(optimizer="bobyqa", -# optCtrl=list(maxfun=2e5)), data=all_actions_data) -all_gmodel <- glmer.nb(count ~ D * I(week_offset)+ scaled_project_age + (D * I(week_offset) | upstream_vcs_link), data=all_actions_data) -#all_gmodel <- glmer(count ~ D * I(week_offset)+ scaled_project_age + (D * I(week_offset)| upstream_vcs_link), data=all_actions_data, nAGQ=0, family = poisson) -#all_gmodel <- glmer.nb(count ~ D * I(week_offset)+ scaled_project_age + (D * I(week_offset) | upstream_vcs_link), -# control=glmerControl(optimizer="bobyqa", -# optCtrl=list(maxfun=2e5)), data=all_actions_data) -all_gmodel <- glmer.nb(count ~ D * I(week_offset)+ scaled_project_age + (D * I(week_offset) | upstream_vcs_link), data=all_actions_data, verbose=TRUE) -#all_gmodel <- glmer(count ~ D * I(week_offset)+ scaled_project_age + (D * I(week_offset)| upstream_vcs_link), data=all_actions_data, nAGQ=0, family = poisson) -#all_gmodel <- glmer.nb(count ~ D * I(week_offset)+ scaled_project_age + (D * I(week_offset) | upstream_vcs_link), -# control=glmerControl(optimizer="bobyqa", -# optCtrl=list(maxfun=2e5)), data=all_actions_data) -all_gmodel <- glmer.nb(count ~ D * I(week_offset)+ scaled_project_age + (D * I(week_offset) | upstream_vcs_link), data=all_actions_data) -#all_gmodel <- glmer(count ~ D * I(week_offset)+ scaled_project_age + (D * I(week_offset)| upstream_vcs_link), data=all_actions_data, nAGQ=0, family = poisson) -#all_gmodel <- glmer.nb(count ~ D * I(week_offset)+ scaled_project_age + (D * I(week_offset) | upstream_vcs_link), -# control=glmerControl(optimizer="bobyqa", -# optCtrl=list(maxfun=2e5)), data=all_actions_data) -all_gmodel <- glmer.nb(count ~ D * I(week_offset)+ scaled_project_age + (D | upstream_vcs_link), data=all_actions_data) +mutate(crescendo_limit = ifelse(week_offset < (-4), 0, 1))|> +cor.test(crescendo_limit, count) +cor.test(second_windowed_data$crescendo_limit, second_windowed_data$count) +#checking crescendo of contributions before document publication +#second window +second_windowed_data <- windowed_data |> +filter(week_offset <= 0) |> +mutate(crescendo_limit = ifelse(week_offset < (-2), 0, 1)) +cor.test(second_windowed_data$crescendo_limit, second_windowed_data$count) +#checking crescendo of contributions before document publication +#second window +second_windowed_data <- windowed_data |> +filter(week_offset <= 0) |> +mutate(crescendo_limit = ifelse(week_offset < (-1), 0, 1)) +cor.test(second_windowed_data$crescendo_limit, second_windowed_data$count) +#checking crescendo of contributions before document publication +#second window +second_windowed_data <- all_actions_data |> +filter(week_offset <= 0) |> +mutate(crescendo_limit = ifelse(week_offset < (-1), 0, 1)) +#testing whether there's a correlation between count and the presce +cor.test(second_windowed_data$crescendo_limit, second_windowed_data$count) library(tidyverse) library(plyr) -library(stringr) +#get the contrib data instead try(setwd(dirname(rstudioapi::getActiveDocumentContext()$path))) -#load in data -contrib_df <- read_csv("../final_data/deb_contrib_pop_change.csv") -readme_df <- read_csv("../final_data/deb_readme_pop_change.csv") -#some expansion needs to happens for each project +contrib_df <- read_csv("../final_data/deb_contrib_did.csv") +#some preprocessing and expansion +col_order <- c("upstream_vcs_link", "age_of_project", "event_date", "event_hash", "before_all_ct", "after_all_ct", "before_mrg_ct", "after_mrg_ct", "before_auth_new", "after_auth_new", "before_commit_new", "after_commit_new") +contrib_df <- contrib_df[,col_order] +contrib_df$ct_before_all <- str_split(gsub("[][]","", contrib_df$before_all_ct), ", ") +contrib_df$ct_after_all <- str_split(gsub("[][]","", contrib_df$after_all_ct), ", ") +contrib_df$ct_before_mrg <- str_split(gsub("[][]","", contrib_df$before_mrg_ct), ", ") +contrib_df$ct_after_mrg <- str_split(gsub("[][]","", contrib_df$after_mrg_ct), ", ") +drop <- c("before_all_ct", "before_mrg_ct", "after_all_ct", "after_mrg_ct") +contrib_df = contrib_df[,!(names(contrib_df) %in% drop)] +# 2 some expansion needs to happens for each project expand_timeseries <- function(project_row) { longer <- project_row |> -pivot_longer(cols = ends_with("new"), +pivot_longer(cols = starts_with("ct"), names_to = "window", values_to = "count") |> -unnest(count) |> -mutate(after_doc = as.numeric(str_detect(window, "after"))) |> -mutate(is_collab = as.numeric(str_detect(window, "collab"))) +unnest(count) +longer$observation_type <- gsub("^.*_", "", longer$window) +longer <- ddply(longer, "observation_type", transform, week=seq(from=0, by=1, length.out=length(observation_type))) +longer$count <- as.numeric(longer$count) +#longer <- longer[which(longer$observation_type == "all"),] return(longer) } -expanded_readme_data <- expand_timeseries(readme_df[1,]) -for (i in 2:nrow(readme_df)){ -expanded_readme_data <- rbind(expanded_readme_data, expand_timeseries(readme_df[i,])) -} -expanded_contrib_data <- expand_timeseries(contrib_df[1,]) +expanded_data <- expand_timeseries(contrib_df[1,]) for (i in 2:nrow(contrib_df)){ -expanded_contrib_data <- rbind(expanded_contrib_data, expand_timeseries(contrib_df[i,])) +expanded_data <- rbind(expanded_data, expand_timeseries(contrib_df[i,])) } -expanded_readme_data$log1pcount <- log1p(expanded_readme_data$count) -expanded_contrib_data$log1pcount <- log1p(expanded_contrib_data$count) -expanded_readme_data$logcount <- log(expanded_readme_data$count) -expanded_contrib_data$logcount <- log(expanded_contrib_data$count) -#breaking out the types of population counts -collab_pop_readme <- expanded_readme_data[which(expanded_readme_data$is_collab == 1),] -contrib_pop_readme <- expanded_readme_data[which(expanded_readme_data$is_collab == 0),] -collab_pop_contrib <- expanded_contrib_data[which(expanded_contrib_data$is_collab == 1),] -contrib_pop_contrib <- expanded_contrib_data[which(expanded_contrib_data$is_collab == 0),] -#import models -library(lme4) -library(optimx) -collab_readme_model <- lmer(log1pcount ~ after_doc + (1| upstream_vcs_link), data=collab_pop_readme, REML=FALSE) -collab_readme_model <- glmer.nb(log1pcount ~ after_doc + (1| upstream_vcs_link), data=collab_pop_readme) -summary(collab_readme_model) -crm_residuals <- residuals(collab_readme_model) -qqnorm(crm_residuals) -collab_readme_model <- glmer.nb(log1pcount ~ after_doc + (after_doc| upstream_vcs_link), data=collab_pop_readme) -summary(collab_readme_model) -crm_residuals <- residuals(collab_readme_model) -qqnorm(crm_residuals) -saveRDS(collab_readme_model, "0510_pop_rm_collab.rda") -contrib_readme_model <- glmer.nb(log1pcount ~ after_doc + (after_doc| upstream_vcs_link), data=contrib_pop_readme) -summary(contrib_readme_model) -saveRDS(contrib_readme_model, "0510_pop_rm_contrib.rda") -collab_contrib_model <- glmer.nb(log1pcount ~ after_doc + (after_doc| upstream_vcs_link), data=collab_pop_contrib) -summary(collab_contrib_model) -saveRDS(collab_contrib_model, "0510_pop_contrib_collab.rda") -contrib_contrib_model <- glmer.nb(log1pcount ~ after_doc + (after_doc| upstream_vcs_link), data=contrib_pop_contrib) -summary(contrib_contrib_model) -saveRDS(contrib_contrib_model, "0510_pop_contrib_contrib.rda") -summary(collab_readme_model) -summary(contrib_readme_model) -qqnorm(crm_residuals) -conrm_residuals <- residuals(contrib_readme_model) -qqnorm(conrm_residuals) -summary(collab_contrib_model) -summary(contrib_contrib_model) +#filter out the windows of time that we're looking at +window_num <- 8 +windowed_data <- expanded_data |> +filter(week >= (27 - window_num) & week <= (27 + window_num)) |> +mutate(D = ifelse(week > 27, 1, 0)) +#scale the age numbers and calculate the week offset here +windowed_data$scaled_project_age <- scale(windowed_data$age_of_project) +windowed_data$week_offset <- windowed_data$week - 27 +#break out the different type of commit actions +all_actions_data <- windowed_data[which(windowed_data$observation_type == "all"),] +mrg_actions_data <- windowed_data[which(windowed_data$observation_type == "mrg"),] +#logging +all_actions_data$logged_count <- log(all_actions_data$count) +all_actions_data$log1p_count <- log1p(all_actions_data$count) +# now for merge +mrg_actions_data$logged_count <- log(mrg_actions_data$count) +mrg_actions_data$log1p_count <- log1p(mrg_actions_data$count) +#checking crescendo of contributions before document publication +#second window +second_windowed_data <- all_actions_data |> +filter(week_offset <= 0) |> +mutate(crescendo_limit = ifelse(week_offset < (-1), 0, 1)) +#testing whether there's a correlation between count and the two weeks before the introduction +cor.test(second_windowed_data$crescendo_limit, second_windowed_data$count) +#checking crescendo of contributions before document publication +#second window +second_windowed_data <- all_actions_data |> +filter(week_offset <= 0) |> +mutate(crescendo_limit = ifelse(week_offset < (-3), 0, 1)) +#testing whether there's a correlation between count and the two weeks before the introduction +cor.test(second_windowed_data$crescendo_limit, second_windowed_data$count) +#checking crescendo of contributions before document publication +#second window +second_windowed_data <- all_actions_data |> +filter(week_offset <= 0) |> +mutate(crescendo_limit = ifelse(week_offset < (-1), 0, 1)) +#testing whether there's a correlation between count and the two weeks before the introduction +cor.test(second_windowed_data$crescendo_limit, second_windowed_data$count) +# this is the file with the lmer multi-level rddAnalysis +library(tidyverse) +library(plyr) +# 0 loading the readme data in +try(setwd(dirname(rstudioapi::getActiveDocumentContext()$path))) +readme_df <- read_csv("../final_data/deb_readme_did.csv") +# 1 preprocessing +#colnames(readme_df) <- c("upstream_vcs_link", "event_date", "event_hash", "before_all_ct", "before_mrg_ct", "after_all_ct", "after_mrg_ct", "before_auth_new", "after_commit_new", "after_auth_new", "before_commit_new") +col_order <- c("upstream_vcs_link", "age_of_project", "event_date", "event_hash", "before_all_ct", "after_all_ct", "before_mrg_ct", "after_mrg_ct", "before_auth_new", "after_auth_new", "before_commit_new", "after_commit_new") +readme_df <- readme_df[,col_order] +readme_df$ct_before_all <- str_split(gsub("[][]","", readme_df$before_all_ct), ", ") +readme_df$ct_after_all <- str_split(gsub("[][]","", readme_df$after_all_ct), ", ") +readme_df$ct_before_mrg <- str_split(gsub("[][]","", readme_df$before_mrg_ct), ", ") +readme_df$ct_after_mrg <- str_split(gsub("[][]","", readme_df$after_mrg_ct), ", ") +drop <- c("before_all_ct", "before_mrg_ct", "after_all_ct", "after_mrg_ct") +readme_df = readme_df[,!(names(readme_df) %in% drop)] +# 2 some expansion needs to happens for each project +expand_timeseries <- function(project_row) { +longer <- project_row |> +pivot_longer(cols = starts_with("ct"), +names_to = "window", +values_to = "count") |> +unnest(count) +longer$observation_type <- gsub("^.*_", "", longer$window) +longer <- ddply(longer, "observation_type", transform, week=seq(from=0, by=1, length.out=length(observation_type))) +longer$count <- as.numeric(longer$count) +#longer <- longer[which(longer$observation_type == "all"),] +return(longer) +} +expanded_data <- expand_timeseries(readme_df[1,]) +for (i in 2:nrow(readme_df)){ +expanded_data <- rbind(expanded_data, expand_timeseries(readme_df[i,])) +} +#filter out the windows of time that we're looking at +window_num <- 8 +windowed_data <- expanded_data |> +filter(week >= (27 - window_num) & week <= (27 + window_num)) |> +mutate(D = ifelse(week > 27, 1, 0)) +#scale the age numbers +windowed_data$scaled_project_age <- scale(windowed_data$age_of_project) +windowed_data$week_offset <- windowed_data$week - 27 +#break out the different types of commit actions that are studied +all_actions_data <- windowed_data[which(windowed_data$observation_type == "all"),] +mrg_actions_data <- windowed_data[which(windowed_data$observation_type == "mrg"),] +#log the dependent +all_actions_data$logged_count <- log(all_actions_data$count) +all_actions_data$log1p_count <- log1p(all_actions_data$count) +#checking crescendo of contributions before document publication +#second window +second_windowed_data <- all_actions_data |> +filter(week_offset <= 0) |> +mutate(crescendo_limit = ifelse(week_offset < (-1), 0, 1)) +#testing whether there's a correlation between count and the two weeks before the introduction +cor.test(second_windowed_data$crescendo_limit, second_windowed_data$count) +lm(count ~ crescendo_limit + week_offset, data = second_windowed_data) +crescendow_huh <- lm(count ~ crescendo_limit + week_offset, data = second_windowed_data) +crescendo_huh <- lm(count ~ crescendo_limit + week_offset, data = second_windowed_data) +summary(crescendo_huh) +#checking crescendo of contributions before document publication +#second window +second_windowed_data <- all_actions_data |> +filter(week_offset <= 0) |> +mutate(crescendo_limit = ifelse(week_offset < (-3), 0, 1)) +#testing whether there's a correlation between count and the two weeks before the introduction +cor.test(second_windowed_data$crescendo_limit, second_windowed_data$count) +crescendo_huh <- lm(count ~ crescendo_limit + week_offset, data = second_windowed_data) +summary(crescendo_huh) +library(tidyverse) +library(plyr) +#get the contrib data instead +try(setwd(dirname(rstudioapi::getActiveDocumentContext()$path))) +contrib_df <- read_csv("../final_data/deb_contrib_did.csv") +#some preprocessing and expansion +col_order <- c("upstream_vcs_link", "age_of_project", "event_date", "event_hash", "before_all_ct", "after_all_ct", "before_mrg_ct", "after_mrg_ct", "before_auth_new", "after_auth_new", "before_commit_new", "after_commit_new") +contrib_df <- contrib_df[,col_order] +contrib_df$ct_before_all <- str_split(gsub("[][]","", contrib_df$before_all_ct), ", ") +contrib_df$ct_after_all <- str_split(gsub("[][]","", contrib_df$after_all_ct), ", ") +contrib_df$ct_before_mrg <- str_split(gsub("[][]","", contrib_df$before_mrg_ct), ", ") +contrib_df$ct_after_mrg <- str_split(gsub("[][]","", contrib_df$after_mrg_ct), ", ") +drop <- c("before_all_ct", "before_mrg_ct", "after_all_ct", "after_mrg_ct") +contrib_df = contrib_df[,!(names(contrib_df) %in% drop)] +# 2 some expansion needs to happens for each project +expand_timeseries <- function(project_row) { +longer <- project_row |> +pivot_longer(cols = starts_with("ct"), +names_to = "window", +values_to = "count") |> +unnest(count) +longer$observation_type <- gsub("^.*_", "", longer$window) +longer <- ddply(longer, "observation_type", transform, week=seq(from=0, by=1, length.out=length(observation_type))) +longer$count <- as.numeric(longer$count) +#longer <- longer[which(longer$observation_type == "all"),] +return(longer) +} +expanded_data <- expand_timeseries(contrib_df[1,]) +for (i in 2:nrow(contrib_df)){ +expanded_data <- rbind(expanded_data, expand_timeseries(contrib_df[i,])) +} +#filter out the windows of time that we're looking at +window_num <- 8 +windowed_data <- expanded_data |> +filter(week >= (27 - window_num) & week <= (27 + window_num)) |> +mutate(D = ifelse(week > 27, 1, 0)) +#scale the age numbers and calculate the week offset here +windowed_data$scaled_project_age <- scale(windowed_data$age_of_project) +windowed_data$week_offset <- windowed_data$week - 27 +#break out the different type of commit actions +all_actions_data <- windowed_data[which(windowed_data$observation_type == "all"),] +mrg_actions_data <- windowed_data[which(windowed_data$observation_type == "mrg"),] +#logging +all_actions_data$logged_count <- log(all_actions_data$count) +all_actions_data$log1p_count <- log1p(all_actions_data$count) +# now for merge +mrg_actions_data$logged_count <- log(mrg_actions_data$count) +mrg_actions_data$log1p_count <- log1p(mrg_actions_data$count) +#checking crescendo of contributions before document publication +#second window +second_windowed_data <- all_actions_data |> +filter(week_offset <= 0) |> +mutate(crescendo_limit = ifelse(week_offset < (-1), 0, 1)) +#testing whether there's a correlation between count and the two weeks before the introduction +cor.test(second_windowed_data$crescendo_limit, second_windowed_data$count) +crescendo_huh <- lm(count ~ crescendo_limit + week_offset, data = second_windowed_data) +summary(crescendo_huh) +crescendo_huh <- lm(count ~ crescendo_limit * week_offset, data = second_windowed_data) +summary(crescendo_huh) +# this is the file with the lmer multi-level rddAnalysis +library(tidyverse) +library(plyr) +# 0 loading the readme data in +try(setwd(dirname(rstudioapi::getActiveDocumentContext()$path))) +readme_df <- read_csv("../final_data/deb_readme_did.csv") +# 1 preprocessing +#colnames(readme_df) <- c("upstream_vcs_link", "event_date", "event_hash", "before_all_ct", "before_mrg_ct", "after_all_ct", "after_mrg_ct", "before_auth_new", "after_commit_new", "after_auth_new", "before_commit_new") +col_order <- c("upstream_vcs_link", "age_of_project", "event_date", "event_hash", "before_all_ct", "after_all_ct", "before_mrg_ct", "after_mrg_ct", "before_auth_new", "after_auth_new", "before_commit_new", "after_commit_new") +readme_df <- readme_df[,col_order] +readme_df$ct_before_all <- str_split(gsub("[][]","", readme_df$before_all_ct), ", ") +readme_df$ct_after_all <- str_split(gsub("[][]","", readme_df$after_all_ct), ", ") +readme_df$ct_before_mrg <- str_split(gsub("[][]","", readme_df$before_mrg_ct), ", ") +readme_df$ct_after_mrg <- str_split(gsub("[][]","", readme_df$after_mrg_ct), ", ") +drop <- c("before_all_ct", "before_mrg_ct", "after_all_ct", "after_mrg_ct") +readme_df = readme_df[,!(names(readme_df) %in% drop)] +# 2 some expansion needs to happens for each project +expand_timeseries <- function(project_row) { +longer <- project_row |> +pivot_longer(cols = starts_with("ct"), +names_to = "window", +values_to = "count") |> +unnest(count) +longer$observation_type <- gsub("^.*_", "", longer$window) +longer <- ddply(longer, "observation_type", transform, week=seq(from=0, by=1, length.out=length(observation_type))) +longer$count <- as.numeric(longer$count) +#longer <- longer[which(longer$observation_type == "all"),] +return(longer) +} +expanded_data <- expand_timeseries(readme_df[1,]) +for (i in 2:nrow(readme_df)){ +expanded_data <- rbind(expanded_data, expand_timeseries(readme_df[i,])) +} +#filter out the windows of time that we're looking at +window_num <- 8 +windowed_data <- expanded_data |> +filter(week >= (27 - window_num) & week <= (27 + window_num)) |> +mutate(D = ifelse(week > 27, 1, 0)) +#scale the age numbers +windowed_data$scaled_project_age <- scale(windowed_data$age_of_project) +windowed_data$week_offset <- windowed_data$week - 27 +#break out the different types of commit actions that are studied +all_actions_data <- windowed_data[which(windowed_data$observation_type == "all"),] +mrg_actions_data <- windowed_data[which(windowed_data$observation_type == "mrg"),] +#log the dependent +all_actions_data$logged_count <- log(all_actions_data$count) +all_actions_data$log1p_count <- log1p(all_actions_data$count) +#checking crescendo of contributions before document publication +#second window +second_windowed_data <- all_actions_data |> +filter(week_offset <= 0) |> +mutate(crescendo_limit = ifelse(week_offset < (-1), 0, 1)) +#testing whether there's a correlation between count and the two weeks before the introduction +cor.test(second_windowed_data$crescendo_limit, second_windowed_data$count) +crescendo_huh <- lm(count ~ crescendo_limit * week_offset, data = second_windowed_data) +summary(crescendo_huh) +#checking crescendo of contributions before document publication +#second window +second_windowed_data <- all_actions_data |> +filter(week_offset <= 0) |> +mutate(crescendo_limit = ifelse(week_offset < (-3), 0, 1)) +#testing whether there's a correlation between count and the two weeks before the introduction +cor.test(second_windowed_data$crescendo_limit, second_windowed_data$count) +crescendo_huh <- lm(count ~ crescendo_limit * week_offset, data = second_windowed_data) +summary(crescendo_huh) +#checking crescendo of contributions before document publication +#second window +second_windowed_data <- all_actions_data |> +filter(week_offset <= 0) |> +mutate(crescendo_limit = ifelse(week_offset < (-1), 0, 1)) +#testing whether there's a correlation between count and the two weeks before the introduction +cor.test(second_windowed_data$crescendo_limit, second_windowed_data$count) +crescendo_huh <- lm(count ~ crescendo_limit * week_offset, data = second_windowed_data) +summary(crescendo_huh) +library(tidyverse) +library(plyr) +# script for the analysis of document readability metrics +# readability metrics will be studied controlled by their length +# gaughan@u.northwestern.edu +# loading in the data +try(setwd(dirname(rstudioapi::getActiveDocumentContext()$path))) +readme_df <- read_csv("../text_analysis/draft_readability_readme.csv") +contributing_df <- read_csv("../text_analysis/draft_readability_contributing.csv") +head(readme_df) +readme_df <- readme_df |> +mutate(coef_grouping <- as.factor(subdir)) +cor.test(readme_df$coef_grouping, readme_df$flesch_reading_ease) +readme_df <- readme_df |> +mutate(coef_grouping <- as.factor(subdir)) +cor.test(readme_df$coef_grouping, readme_df$flesch_reading_ease) +cor(readme_df$coef_grouping, readme_df$flesch_reading_ease) +readme_df <- readme_df |> +mutate(coef_grouping <- as.factor(subdir)) +test_lm <- lm(flesch_reading_ease ~ coef_grouping,data=readme_df) +readme_df <- readme_df |> +mutate(coef_grouping <- as.factor(subdir)) +test_lm <- lm(flesch_reading_ease ~ coef_grouping,data=readme_df) +test_lm <- lm(flesch_reading_ease ~ subdir,data=readme_df) +summary(test_lm) +test_lm <- lm(flesch_reading_ease ~ as.factor(subdir),data=readme_df) +summary(test_lm) +head(readme_df) +test_lm <- lm(flesch_reading_ease ~ char_count + as.factor(subdir),data=readme_df) +summary(test_lm) +head(readme_df) +test_lm <- lm(linsear_write_formula ~ char_count + as.factor(subdir),data=readme_df) +summary(test_lm) +head(readme_df) +test_lm <- lm(mcalpine_eflaw ~ char_count + as.factor(subdir),data=readme_df) +summary(test_lm) +test_lm <- lm(mcalpine_eflaw ~ word_count + as.factor(subdir),data=readme_df) +summary(test_lm) +aggregate(readme_df[, 3:11], list(readme_df$subdir), mean) +aggregate(readme_df[, 3:10], list(readme_df$subdir), mean) +#readme_df <- readme_df |> +# mutate(coef_grouping <- as.factor(subdir)) +#test_lm <- lm(mcalpine_eflaw ~ word_count + as.factor(subdir),data=readme_df) +#summary(test_lm) +aggregate(contributing_df[, 3:10], list(contributing_df$subdir), mean) +library(tidyverse) +library(plyr) +# script for the analysis of document readability metrics +# readability metrics will be studied controlled by their length +# gaughan@u.northwestern.edu +# loading in the data +try(setwd(dirname(rstudioapi::getActiveDocumentContext()$path))) +readme_df <- read_csv("../text_analysis/draft_readability_readme.csv") +contributing_df <- read_csv("../text_analysis/draft_readability_contributing.csv") +head(readme_df) +aggregate(readme_df[, 3:10], list(readme_df$subdir), mean) +aggregate(readme_df[, 3:10], list(readme_df$subdir), median) +#readme_df <- readme_df |> +# mutate(coef_grouping <- as.factor(subdir)) +#test_lm <- lm(mcalpine_eflaw ~ word_count + as.factor(subdir),data=readme_df) +#summary(test_lm) +aggregate(contributing_df[, 3:10], list(contributing_df$subdir), median) +rm(list=ls()) +set.seed(424242) +library(readr) library(ggplot2) -expanded_readme_data |> -ggplot(aes(x = after_doc, y = log1pcount, col = as.factor(is_collab))) + -geom_point() + geom_jitter() -expanded_readme_data |> -ggplot(aes(x = after_doc, y = count, col = as.factor(is_collab))) + -geom_point() + geom_jitter() -expanded_readme_data |> -ggplot(aes(x = after_doc, y = log1pcount, col = as.factor(is_collab))) + -geom_point() + geom_jitter() -#primary analysis for cross-sectional community metrics +library(tidyverse) +overall_data <- read_csv('../final_data/deb_full_data.csv',show_col_types = FALSE) overall_data <- read_csv('../final_data/deb_full_data.csv',show_col_types = FALSE) octo_data <- read_csv('../final_data/deb_octo_data.csv', show_col_types = FALSE) readme_data <- read_csv("../final_data/deb_readme_roster.csv", show_col_types = FALSE) -contributing_data <- read_csv("../final_data/deb_contribfile_roster.csv", show_col_types = FALSE) overall_data$mmt <- (((overall_data$collaborators * 2)+ overall_data$contributors) / (overall_data$contributors + overall_data$collaborators)) mean(overall_data$mmt) hist(overall_data$mmt, probability = TRUE) -#age_vector <- overall_data$age_of_project/365 -#quantile(age_vector) -overall_data$new.age <- as.numeric(cut(overall_data$age_of_project/365, breaks=c(0,7.524197,10.323056,13.649367,17), labels=c(1,2,3,4))) -table(overall_data$new.age) -overall_data$new.age.factor <- as.factor(overall_data$new.age) +#the basic stuff for the overall data +overall_data$mmt <- (((overall_data$collaborators * 2)+ overall_data$contributors) / (overall_data$contributors + overall_data$collaborators)) +mean(overall_data$mmt) +hist(overall_data$mmt, probability = TRUE) +#some new variables around age +#overall_data$new.age <- as.numeric(cut(overall_data$age_of_project/365, breaks=c(0,7.524197,10.323056,13.649367,17), labels=c(1,2,3,4))) +#table(overall_data$new.age) +#overall_data$new.age.factor <- as.factor(overall_data$new.age) overall_data$scaled_age <- scale(overall_data$age_of_project) +#model mmtmodel1 <- lm(underproduction_mean ~ mmt + scaled_age, data=overall_data) summary(mmtmodel1) qqnorm(residuals(mmtmodel1)) -summary(mmtmodel1) -octo_data$scaled_age <- scale(octo_data$age_of_project) -octo_data$mmt <- (((octo_data$collaborators * 2)+ octo_data$contributors) / (octo_data$contributors + octo_data$collaborators)) -octo_data$issue_mmt <- ((octo_data$issue_contrib_count * 2) + (octo_data$total_contrib - octo_data$issue_contrib_count)) / (octo_data$total_contrib) -octo_data$wiki_mmt <- ((octo_data$wiki_contrib_count * 2) + (octo_data$total_contrib - octo_data$wiki_contrib_count)) / (octo_data$total_contrib) -g4 <- ggplot(octo_data) -g4 -#below are the models for the octo data, there should be analysis for each one -octo_mmtmodel1 <- lm(underproduction_mean ~ mmt + new.age.factor, data=octo_data) -summary(octo_mmtmodel1) -#below are the models for the octo data, there should be analysis for each one -octo_mmtmodel1 <- lm(underproduction_mean ~ mmt + scaled_age, data=octo_data) -summary(octo_mmtmodel1) -issue_mmtmodel1 <- lm(underproduction_mean ~ issue_mmt + scaled_age, data=octo_data) -summary(issue_mmtmodel1) -sqrt_issue_mmtmodel1 <- lm(underproduction_mean ~ sqrt_issue_mmt + scaled_age, data=octo_data) -wiki_mmtmodel1 <- lm(underproduction_mean ~ wiki_mmt + scaled_age, data=octo_data) -summary(wiki_mmtmodel1) -qqnorm(residuals(issue_mmtmodel1)) -qqnorm(residuals(wiki_mmtmodel1)) -texreg(list(octo_mmtmodel1, issue_mmtmodel1, wiki_mmtmodel1), stars=NULL, digits=2, -custom.model.names=c( 'M1: MMT','M2: issue contrib.', 'M3: wiki_contrib.' ), -custom.coef.names=c('(Intercept)', 'MMT', 'Issues', 'Age-2', 'Age-3', 'Age-4', 'Wiki'), -use.packages=FALSE, table=FALSE, ci.force = TRUE) -library(texreg) #my little "lib" -texreg(list(octo_mmtmodel1, issue_mmtmodel1, wiki_mmtmodel1), stars=NULL, digits=2, -custom.model.names=c( 'M1: MMT','M2: issue contrib.', 'M3: wiki_contrib.' ), -custom.coef.names=c('(Intercept)', 'MMT', 'Issues', 'Age-2', 'Age-3', 'Age-4', 'Wiki'), -use.packages=FALSE, table=FALSE, ci.force = TRUE) -texreg(list(octo_mmtmodel1, issue_mmtmodel1, wiki_mmtmodel1), stars=NULL, digits=2, -custom.model.names=c( 'M1: MMT','M2: issue contrib.', 'M3: wiki_contrib.' ), -custom.coef.names=c('(Intercept)', 'MMT', 'Issues', 'scaled_age', 'Wiki'), -use.packages=FALSE, table=FALSE, ci.force = TRUE) -summary(octo_mmtmodel1) -summary(wiki_mmtmodel1) -#left skewed data, need to transform -sum(is.na(octo_data$wiki_mmt)) -#left skewed data, need to transform -sum(is.na(octo_data$issue_mmt)) -#left skewed data, need to transform -sum(is.na(octo_data$mmt)) -test_frame <- na.omit(octo_data) -#left skewed data, need to transform -sum(is.na(octo_data$issue_contrib_count)) -#left skewed data, need to transform -sum(is.na(octo_data$wiki_contrib_count)) -octo_data$issue_mmt <- ((octo_data$issue_contrib_count * 2) + (octo_data$total_contrib - octo_data$issue_contrib_count)) / (octo_data$total_contrib) -#left skewed data, need to transform -typeof(octo_data$wiki_contrib_count) -View(octo_data) -octo_data$issue_mmt <- ((octo_data$issue_contrib_count * 2) + (octo_data$api_contrib_count + octo_data$file_contrib_count + octo_data$wiki_contrib_count)) / (octo_data$api_contrib_count + octo_data$file_contrib_count + octo_data$wiki_contrib_count + octo_data$issue_contrib_count) -sum(is.na(octo_data$issue_mmt)) -octo_data$issue_mmt <- ((octo_data$issue_contrib_count * 2) + (octo_data$total_contrib - octo_data$issue_contrib_count)) / (octo_data$total_contrib) -sum(is.na(octo_data$issue_mmt)) -sum(octo_data$total_contrib == 0) -#clean octo data -octo_data <- filter(octo_data, total_contrib == 0) -sum(octo_data$total_contrib == 0) -octo_data <- read_csv('../final_data/deb_octo_data.csv', show_col_types = FALSE) -#clean octo data -octo_data <- filter(octo_data, total_contrib != 0) +# below this is the analysis for the octo data +octo_data$new.age <- as.numeric(cut(octo_data$age_of_project/365, breaks=c(0,7.524197,10.323056,13.649367,17), labels=c(1,2,3,4))) +table(octo_data$new.age) +octo_data$new.age.factor <- as.factor(octo_data$new.age) octo_data$scaled_age <- scale(octo_data$age_of_project) octo_data$mmt <- (((octo_data$collaborators * 2)+ octo_data$contributors) / (octo_data$contributors + octo_data$collaborators)) +mean(octo_data$mmt) +hist(octo_data$mmt) +head(octo_data) +#getting the mmt-equivalent for both issue activity as well as wiki contrib activity octo_data$issue_mmt <- ((octo_data$issue_contrib_count * 2) + (octo_data$total_contrib - octo_data$issue_contrib_count)) / (octo_data$total_contrib) +octo_data$sqrt_issue_mmt <- sqrt(octo_data$issue_mmt) #right skewed data, need to transform octo_data$wiki_mmt <- ((octo_data$wiki_contrib_count * 2) + (octo_data$total_contrib - octo_data$wiki_contrib_count)) / (octo_data$total_contrib) +hist(octo_data$wiki_mmt) #below are the models for the octo data, there should be analysis for each one -octo_mmtmodel1 <- lm(underproduction_mean ~ mmt + scaled_age, data=octo_data) -summary(octo_mmtmodel1) -issue_mmtmodel1 <- lm(underproduction_mean ~ issue_mmt + scaled_age, data=octo_data) -issue_mmtmodel1 <- lm(underproduction_mean ~ issue_mmt + scaled_age, data=octo_data) -qqnorm(residuals(issue_mmtmodel1)) -sqrt_issue_mmtmodel1 <- lm(underproduction_mean ~ sqrt_issue_mmt + scaled_age, data=octo_data) -wiki_mmtmodel1 <- lm(underproduction_mean ~ wiki_mmt + scaled_age, data=octo_data) -summary(wiki_mmtmodel1) -qqnorm(residuals(wiki_mmtmodel1)) -texreg(list(octo_mmtmodel1, issue_mmtmodel1, wiki_mmtmodel1), stars=NULL, digits=2, -custom.model.names=c( 'M1: MMT','M2: issue contrib.', 'M3: wiki_contrib.' ), -custom.coef.names=c('(Intercept)', 'MMT', 'Issues', 'scaled_age', 'Wiki'), -use.packages=FALSE, table=FALSE, ci.force = TRUE) -texreg(list(octo_mmtmodel1, issue_mmtmodel1, wiki_mmtmodel1), stars=NULL, digits=2, -custom.model.names=c( 'M1: MMT','M2: issue contrib.', 'M3: wiki contrib.' ), -custom.coef.names=c('(Intercept)', 'MMT', 'scaled_age', 'Issue MMT', 'Wiki MMT'), -use.packages=FALSE, table=FALSE, ci.force = TRUE) -qqnorm(residuals(wiki_mmtmodel1)) -View(octo_data) -#TODO: find the overlap between projects with octo data and projects with readmes or contributings -readme_did_roster <- read_csv("../final_data/deb_readme_did.csv", show_col_types = FALSE) -contrib_did_roster <- read_csv("../final_data/deb_contrib_did.csv", show_col_types = FALSE) -octo_data |> -mutate(has_readme = as.numeric(upstream_vcs_link %in% readme_did_roster$upstream_vcs_link)) -View(octo_data) -octo_data <- octo_data |> -mutate(has_readme = as.numeric(upstream_vcs_link %in% readme_did_roster$upstream_vcs_link)) |> -mutate(has_contrib = as.numeric(upstream_vcs_link %in% contrib_did_roster$upstream_vcs_link)) -View(octo_data) -#below here is the analysis for the readme.md data -cor.test(octo_data$mmt, octo_data$has_readme) -cor.test(octo_data$mmt, octo_data$has_contributing) -cor.test(octo_data$mmt, octo_data$has_contrib) -issues_expansion <- lm(issue_mmt ~ has_readme + scaled_age, data=octo_data) -summary(issues_expansion) -issues_expansion <- lm(issue_mmt ~ has_contrib + scaled_age, data=octo_data) -summary(issues_expansion) -#below here is the analysis for the readme.md data -cor.test(octo_data$mmt, octo_data$scaled_age) -#below here is the analysis for the readme.md data -cor.test(octo_data$mmt, octo_data$scaled_age) -octo_mmtmodel1 <- lm(underproduction_mean ~ mmt + scaled_age + has_readme + has_contributing, data=octo_data) -octo_data <- octo_data |> -mutate(has_readme = as.numeric(upstream_vcs_link %in% readme_did_roster$upstream_vcs_link)) |> -mutate(has_contrib = as.numeric(upstream_vcs_link %in% contrib_did_roster$upstream_vcs_link)) -octo_mmtmodel1 <- lm(underproduction_mean ~ mmt + scaled_age + has_readme + has_contributing, data=octo_data) octo_mmtmodel1 <- lm(underproduction_mean ~ mmt + scaled_age + has_readme + has_contrib, data=octo_data) summary(octo_mmtmodel1) issue_mmtmodel1 <- lm(underproduction_mean ~ issue_mmt + scaled_age + has_readme + has_contrib, data=octo_data) summary(issue_mmtmodel1) +qqnorm(residuals(issue_mmtmodel1)) wiki_mmtmodel1 <- lm(underproduction_mean ~ wiki_mmt + scaled_age + has_readme + has_contrib, data=octo_data) summary(wiki_mmtmodel1) +#getting some of the information in about whether projects have specific files +readme_did_roster <- read_csv("../final_data/deb_readme_did.csv", show_col_types = FALSE) +contrib_did_roster <- read_csv("../final_data/deb_contrib_did.csv", show_col_types = FALSE) +octo_data <- octo_data |> +mutate(has_readme = as.numeric(upstream_vcs_link %in% readme_did_roster$upstream_vcs_link)) |> +mutate(has_contrib = as.numeric(upstream_vcs_link %in% contrib_did_roster$upstream_vcs_link)) +overall_data <- overall_data |> +mutate(has_readme = as.numeric(upstream_vcs_link %in% readme_did_roster$upstream_vcs_link)) |> +mutate(has_contrib = as.numeric(upstream_vcs_link %in% contrib_did_roster$upstream_vcs_link)) +#below are the models for the octo data, there should be analysis for each one +octo_mmtmodel1 <- lm(underproduction_mean ~ mmt + scaled_age + has_readme + has_contrib, data=octo_data) +summary(octo_mmtmodel1) +issue_mmtmodel1 <- lm(underproduction_mean ~ issue_mmt + scaled_age + has_readme + has_contrib, data=octo_data) +summary(issue_mmtmodel1) +qqnorm(residuals(issue_mmtmodel1)) +wiki_mmtmodel1 <- lm(underproduction_mean ~ wiki_mmt + scaled_age + has_readme + has_contrib, data=octo_data) +summary(wiki_mmtmodel1) +qqnorm(residuals(wiki_mmtmodel1)) +#these next three are looking at mmt as an outcome of other factors +mmt_outcome_model <- lm(mmt ~ scaled_age + as.factor(has_readme) + as.factor(has_contrib), data = octo_data) +summary(mmt_outcome_model) +library(texreg) #my little "lib" texreg(list(octo_mmtmodel1, issue_mmtmodel1, wiki_mmtmodel1), stars=NULL, digits=2, custom.model.names=c( 'M1: MMT','M2: issue contrib.', 'M3: wiki contrib.' ), custom.coef.names=c('(Intercept)', 'MMT', 'scaled_age', 'has readme', 'has contrib', 'Issue MMT', 'Wiki MMT'), use.packages=FALSE, table=FALSE, ci.force = TRUE) +govdoc_issuesmmt <- lm(issue_mmt ~ scaled_age + as.factor(has_readme) + as.factor(has_contrib), data=octo_data) +summary(govdoc_issuesmmt) +View(octo_data) +octo_cleaned <- octo_data[octo_data$issue_mmt != NaN] +octo_cleaned <- octo_data[!is.nan(octo_data$issue_mmt),] +#below are the models for the octo data, there should be analysis for each one +octo_mmtmodel1 <- lm(underproduction_mean ~ mmt + scaled_age + has_readme + has_contrib, data=octo_cleaned) +summary(octo_mmtmodel1) +issue_mmtmodel1 <- lm(underproduction_mean ~ issue_mmt + scaled_age + has_readme + has_contrib, data=octo_cleaned) +summary(issue_mmtmodel1) qqnorm(residuals(issue_mmtmodel1)) -qqnorm(residuals(wiki_mmtmodel1)) -#below here is the analysis for the readme.md data -cor.test(octo_data$mmt, octo_data$issue_mmt) -#below here is the analysis for the readme.md data -cor.test(octo_data$mmt, octo_data$wiki_mmt) -#below here is the analysis for the readme.md data -cor.test(octo_data$mmt, octo_data$has_readme) -cor.test(octo_data$has_readme, octo_data$has_contrib) +wiki_mmtmodel1 <- lm(underproduction_mean ~ wiki_mmt + scaled_age + has_readme + has_contrib, data=octo_cleaned) +summary(wiki_mmtmodel1) +write.csv(octo_cleaned,"cleaned_octo.csv", row.names = FALSE) +texreg(list(octo_mmtmodel1, issue_mmtmodel1, wiki_mmtmodel1), stars=NULL, digits=2, +custom.model.names=c( 'M1: MMT','M2: issue contrib.', 'M3: wiki contrib.' ), +custom.coef.names=c('(Intercept)', 'MMT', 'scaled_age', 'has readme', 'has contrib', 'Issue MMT', 'Wiki MMT'), +use.packages=FALSE, table=FALSE, ci.force = TRUE) +rm(list=ls()) +set.seed(424242) library(readr) library(ggplot2) library(tidyverse) @@ -335,178 +455,58 @@ readme_data <- read_csv("../final_data/deb_readme_roster.csv", show_col_types = contributing_data <- read_csv("../final_data/deb_contribfile_roster.csv", show_col_types = FALSE) overall_data$mmt <- (((overall_data$collaborators * 2)+ overall_data$contributors) / (overall_data$contributors + overall_data$collaborators)) mean(overall_data$mmt) +#the basic stuff for the overall data +overall_data$mmt <- (((overall_data$collaborators * 2)+ overall_data$contributors) / (overall_data$contributors + overall_data$collaborators)) +mean(overall_data$mmt) hist(overall_data$mmt, probability = TRUE) -mmtmodel1 <- lm(underproduction_mean ~ mmt + scaled_age, data=overall_data) -overall_data$scaled_age <- scale(overall_data$age_of_project) +#model mmtmodel1 <- lm(underproduction_mean ~ mmt + scaled_age, data=overall_data) summary(mmtmodel1) +qqnorm(residuals(mmtmodel1)) #clean octo data octo_data <- filter(octo_data, total_contrib != 0) +#some new variables around age +#overall_data$new.age <- as.numeric(cut(overall_data$age_of_project/365, breaks=c(0,7.524197,10.323056,13.649367,17), labels=c(1,2,3,4))) +#table(overall_data$new.age) +#overall_data$new.age.factor <- as.factor(overall_data$new.age) +overall_data$scaled_age <- scale(overall_data$age_of_project) +#model +mmtmodel1 <- lm(underproduction_mean ~ mmt + scaled_age, data=overall_data) +table(octo_data$new.age) +octo_data$new.age.factor <- as.factor(octo_data$new.age) octo_data$scaled_age <- scale(octo_data$age_of_project) octo_data$mmt <- (((octo_data$collaborators * 2)+ octo_data$contributors) / (octo_data$contributors + octo_data$collaborators)) +mean(octo_data$mmt) +hist(octo_data$mmt) +head(octo_data) +#getting the mmt-equivalent for both issue activity as well as wiki contrib activity octo_data$issue_mmt <- ((octo_data$issue_contrib_count * 2) + (octo_data$total_contrib - octo_data$issue_contrib_count)) / (octo_data$total_contrib) #right skewed data, need to transform octo_data$wiki_mmt <- ((octo_data$wiki_contrib_count * 2) + (octo_data$total_contrib - octo_data$wiki_contrib_count)) / (octo_data$total_contrib) -octo_mmtmodel1 <- lm(underproduction_mean ~ mmt + scaled_age + has_readme + has_contrib, data=octo_data) -#find the overlap between projects with octo data and projects with readmes or contributings +#getting some of the information in about whether projects have specific files readme_did_roster <- read_csv("../final_data/deb_readme_did.csv", show_col_types = FALSE) contrib_did_roster <- read_csv("../final_data/deb_contrib_did.csv", show_col_types = FALSE) octo_data <- octo_data |> mutate(has_readme = as.numeric(upstream_vcs_link %in% readme_did_roster$upstream_vcs_link)) |> mutate(has_contrib = as.numeric(upstream_vcs_link %in% contrib_did_roster$upstream_vcs_link)) -octo_mmtmodel1 <- lm(underproduction_mean ~ mmt + scaled_age + has_readme + has_contrib, data=octo_data) -summary(octo_mmtmodel1) -mmt_outcome_model <- lm(mmt ~ scaled_age + has_readme + has_contrib, data = octo_data) -summary(mmt_outcome_model) -mmt_outcome_model <- lm(issue_mmt ~ scaled_age + has_readme + has_contrib, data = octo_data) -summary(mmt_outcome_model) -mmt_outcome_model <- lm(wiki_mmt ~ scaled_age + has_readme + has_contrib, data = octo_data) -summary(mmt_outcome_model) -mmt_outcome_model <- lm(issue_mmt ~ scaled_age + has_readme + has_contrib, data = octo_data) -summary(mmt_outcome_model) -mmt_outcome_model <- lm(mmt ~ scaled_age + has_readme + has_contrib, data = octo_data) -summary(mmt_outcome_model) overall_data <- overall_data |> mutate(has_readme = as.numeric(upstream_vcs_link %in% readme_did_roster$upstream_vcs_link)) |> mutate(has_contrib = as.numeric(upstream_vcs_link %in% contrib_did_roster$upstream_vcs_link)) -all_mmt_outcome_model <- lm(mmt ~ scaled_age + has_readme + has_contrib, data = overall_data) -summary(all_mmt_outcome_model) -#pulling in the group data for the ranef coefficients -rm_grouping <- read_csv('../051224_readme_grouped.csv',show_col_types = FALSE) -#pulling in the group data for the ranef coefficients -rm_grouping <- read_csv('051224_readme_grouped.csv',show_col_types = FALSE) -contrib_grouping <- read_csv('051224_contrib_grouped.csv', show_col_types = FALSE) -View(contrib_grouping) -View(rm_grouping) -View(readme_did_roster) -grouped_rm <- left_join(rm_grouping, overall_data, by = c("level","upstream_vcs_link")) -rm_grouping <- rm_grouping |> -rename(upstream_vcs_link = level) -View(rm_grouping) -grouped_rm <- left_join(rm_grouping, overall_data, by="upstream_vcs_link") -View(grouped_rm) -contrib_grouping <- contrib_grouping |> -rename(upstream_vcs_link = level) -grouped_contrib <- left_join(contrib_grouping, overall_data, by="upstream_vcs_link") -View(grouped_rm) -#analyses -cor.test(grouped_rm$mmt, grouped_rm$ranef_grouping) -cor.test(grouped_contrib$mmt, grouped_contrib$ranef_grouping) -#analyses -cor.test(grouped_rm$underproduction_mean, grouped_rm$ranef_grouping) -cor.test(grouped_contrib$underproduction_mean, grouped_contrib$ranef_grouping) -#analyses -cor.test(grouped_rm$underproduction_mean, grouped_rm$estimate) -cor.test(grouped_contrib$underproduction_mean, grouped_contrib$estimate) -View(grouped_rm) -#test with linear model -grouping_model <- lm(underproduction_mean ~ estimate + scaled_age, data=grouped_rm) -summary(grouping_model) -#test with linear model -grouping_model <- lm(underproduction_mean ~ estimate + mmt + scaled_age, data=grouped_rm) -summary(grouping_model) -#test with linear model -grouping_model <- lm(underproduction_mean ~ ranef_grouping + mmt + scaled_age, data=grouped_rm) -summary(grouping_model) -grouping_model_contrib <- lm(underproduction_mean ~ ranef_grouping + mmt + scaled_age, data=grouped_contrib) -summary(grouping_model_contrib) -#test with linear model -grouping_model_rm <- lm(underproduction_mean ~ estimate + mmt + scaled_age, data=grouped_rm) -summary(grouping_model_rm) -grouping_model_contrib <- lm(underproduction_mean ~ estimate + mmt + scaled_age, data=grouped_contrib) -summary(grouping_model_contrib) -#test with linear model -grouping_model_rm <- glm.nb(underproduction_mean ~ ranef_grouping + mmt + scaled_age, data=grouped_rm) -#pulling in the group data for the ranef coefficients -rm_grouping <- read_csv('051224_readme_grouped.csv',show_col_types = FALSE) -contrib_grouping <- read_csv('051224_contrib_grouped.csv', show_col_types = FALSE) -rm_grouping <- rm_grouping |> -rename(upstream_vcs_link = level)|> -mutate(factored_group = as.factor(ranef_grouping)) -contrib_grouping <- contrib_grouping |> -rename(upstream_vcs_link = level) |> -mutate(factored_group = as.factor(ranef_grouping)) -grouped_rm <- left_join(rm_grouping, overall_data, by="upstream_vcs_link") -grouped_contrib <- left_join(contrib_grouping, overall_data, by="upstream_vcs_link") -#analyses -cor.test(grouped_rm$underproduction_mean, grouped_rm$factored_group) -#test with linear model -grouping_model_rm <- lm(underproduction_mean ~ factored_group + mmt + scaled_age, data=grouped_rm) -summary(grouping_model_rm) -grouping_model_contrib <- lm(underproduction_mean ~ factored_group + mmt + scaled_age, data=grouped_contrib) -summary(grouping_model_contrib) -summary(grouping_model_rm) -grouping_model_contrib <- lm(underproduction_mean ~ factored_group + mmt + scaled_age, data=grouped_contrib) -summary(grouping_model_contrib) -qqnorm(residuals(grouping_model_rm)) -qqnorm(residuals(grouping_model_contrib)) -rm_did <- read_csv('../final_data/deb_readme_did.csv',show_col_types = FALSE) -contrib_did <- read_csv('../final_data/deb_contrib_did.csv', show_col_types = FALSE) -grouped_rm <- left_join(grouped_rm, rm_did, by="upstream_vcs_link") -grouped_contrib <- left_join(grouped_contrib, contrib_did, by="upstream_vcs_link") -#calculate in terms of July 6, 2020 -typeof(event_date) -#calculate in terms of July 6, 2020 -typeof(grouped_rm$event_date) -#calculate in terms of July 6, 2020 -typeof(as.Date(grouped_rm$event_date)) -how_long_has_file <- as.Date("2020-07-06") - as.Date(grouped_rm$event_date) -how_long_has_file <- difftime(as.Date("2020-07-06"), as.Date(grouped_rm$event_date)) -how_long_has_file <- difftime(as.Date("2020-07-06"), as.Date(grouped_rm$event_date), units = "days") -#calculate in terms of July 6, 2020 -grouped_rm$event_date -#calculate in terms of July 6, 2020 -dates <- as.POSIXct(grouped_rm$event_date,tz="UTC") -dates -typeof(dates) -how_long_has_file <- difftime(as.Date("2020-07-06"), as.Date(grouped_rm$event_date), units = "days") -#calculate in terms of July 6, 2020 -dtparts = t(as.data.frame(strsplit(grouped_rm$event_date,' '))) -#calculate in terms of July 6, 2020 -dtparts = t(as.data.frame(strsplit(grouped_rm$event_date,' '))) -#calculate in terms of July 6, 2020 -dtparts = t(as.data.frame(strsplit(as.character(grouped_rm$event_date),' '))) -View(dtparts) -thetimes = chron(dates=dtparts[,1],times=dtparts[,2], -+ format=c('y-m-d','h:m:s')) -thetimes = chron(dates=dtparts[,1],times=dtparts[,2], format=c('y-m-d','h:m:s')) -#calculate in terms of July 6, 2020 -library(chron) -dtparts = t(as.data.frame(strsplit(as.character(grouped_rm$event_date),' '))) -thetimes = chron(dates=dtparts[,1],times=dtparts[,2], format=c('y-m-d','h:m:s')) -typeof(thetimes) -grouped_rm <- grouped_rm |> -mutate(formatted_event_time = chron(dates=dtparts[,1],times=dtparts[,2], format=c('y-m-d','h:m:s'))) |> -mutate(event_delta = difftime(as.chron("2020-07-06"), formatted_event_time, units = "days")) -View(grouped_rm) -#test with linear model -grouping_model_rm <- lm(underproduction_mean ~ event_delta*factored_group + mmt + scaled_age, data=grouped_rm) -summary(grouping_model_rm) -#now doing it for the contrib_data -contrib_dtparts = t(as.data.frame(strsplit(as.character(grouped_contrib$event_date),' '))) -grouped_contrib <- grouped_contrib |> -mutate(formatted_event_time = chron(dates=contrib_dtparts[,1],times=contrib_dtparts[,2], format=c('y-m-d','h:m:s'))) |> -mutate(event_delta = difftime(as.chron("2020-07-06"), formatted_event_time, units = "days")) -grouping_model_contrib <- lm(underproduction_mean ~ event_delta*factored_group + mmt + scaled_age, data=grouped_contrib) -summary(grouping_model_contrib) -summary(grouping_model_rm) -qqnorm(residuals(grouping_model_rm)) -grouping_model_contrib <- lm(underproduction_mean ~ event_delta*factored_group + mmt + scaled_age, data=grouped_contrib) -summary(grouping_model_contrib) -qqnorm(residuals(grouping_model_contrib)) -qqnorm(residuals(grouping_model_rm)) -qqnorm(residuals(grouping_model_contrib)) -issues_expansion <- lm(issue_mmt ~ as.factor(has_contrib) + scaled_age, data=octo_data) -summary(issues_expansion) -govdoc_mmt <- lm(mmt ~ as.factor(has_contrib) + scaled_age, data=octo_data) -summary(govdoc_mmt) -govdoc_mmt <- lm(mmt ~ as.factor(has_readme) + scaled_age, data=octo_data) -summary(govdoc_mmt) -govdoc_issuesmmt <- lm(issue_mmt ~ as.factor(has_readme) + scaled_age, data=octo_data) -summary(govdoc_issuesmmt) -mmt_outcome_model <- lm(mmt ~ scaled_age + as.factor(has_readme) + as.factor(has_contrib), data = octo_data) -summary(mmt_outcome_model) -all_mmt_outcome_model <- lm(mmt ~ scaled_age + as.factor(has_readme) + as.factor(has_contrib), data = overall_data) -summary(all_mmt_outcome_model) -govdoc_issuesmmt <- lm(issue_mmt ~ scaled_age + as.factor(has_readme) + as.factor(has_contrib), data=octo_data) -summary(govdoc_issuesmmt) +#below are the models for the octo data, there should be analysis for each one +octo_mmtmodel1 <- lm(underproduction_mean ~ mmt + scaled_age + has_readme + has_contrib, data=octo_data) +summary(octo_mmtmodel1) +issue_mmtmodel1 <- lm(underproduction_mean ~ issue_mmt + scaled_age + has_readme + has_contrib, data=octo_data) +summary(issue_mmtmodel1) +qqnorm(residuals(issue_mmtmodel1)) +wiki_mmtmodel1 <- lm(underproduction_mean ~ wiki_mmt + scaled_age + has_readme + has_contrib, data=octo_data) +summary(wiki_mmtmodel1) +library(texreg) #my little "lib" +texreg(list(octo_mmtmodel1, issue_mmtmodel1, wiki_mmtmodel1), stars=NULL, digits=2, +custom.model.names=c( 'M1: MMT','M2: issue contrib.', 'M3: wiki contrib.' ), +custom.coef.names=c('(Intercept)', 'MMT', 'scaled_age', 'has readme', 'has contrib', 'Issue MMT', 'Wiki MMT'), +use.packages=FALSE, table=FALSE, ci.force = TRUE) +#now large MMT model taking into account having contributing or README +mmtmodel2 <- lm(underproduction_mean ~ mmt + scaled_age + has_readme + has_contrib, data=overall_data) +summary(mmtmodel2) +qqnorm(residuals(mmtmodel2)) +summary(mmtmodel2) diff --git a/R/GovRiskPower.R b/R/GovRiskPower.R index 1299ed8..468fb67 100644 --- a/R/GovRiskPower.R +++ b/R/GovRiskPower.R @@ -10,7 +10,6 @@ overall_data <- read_csv('../final_data/deb_full_data.csv',show_col_types = FALS octo_data <- read_csv('../final_data/deb_octo_data.csv', show_col_types = FALSE) readme_data <- read_csv("../final_data/deb_readme_roster.csv", show_col_types = FALSE) contributing_data <- read_csv("../final_data/deb_contribfile_roster.csv", show_col_types = FALSE) - overall_data$mmt <- (((overall_data$collaborators * 2)+ overall_data$contributors) / (overall_data$contributors + overall_data$collaborators)) mean(overall_data$mmt) hist(overall_data$mmt, probability = TRUE) @@ -61,7 +60,6 @@ overall_data <- overall_data |> mutate(has_readme = as.numeric(upstream_vcs_link %in% readme_did_roster$upstream_vcs_link)) |> mutate(has_contrib = as.numeric(upstream_vcs_link %in% contrib_did_roster$upstream_vcs_link)) - #below are the models for the octo data, there should be analysis for each one octo_mmtmodel1 <- lm(underproduction_mean ~ mmt + scaled_age + has_readme + has_contrib, data=octo_data) summary(octo_mmtmodel1) @@ -74,15 +72,19 @@ wiki_mmtmodel1 <- lm(underproduction_mean ~ wiki_mmt + scaled_age + has_readme + summary(wiki_mmtmodel1) qqnorm(residuals(wiki_mmtmodel1)) -#these next three are looking at mmt as an outcome of other factors -mmt_outcome_model <- lm(mmt ~ scaled_age + as.factor(has_readme) + as.factor(has_contrib), data = octo_data) -summary(mmt_outcome_model) +#now large MMT model taking into account having contributing or README +mmtmodel2 <- lm(underproduction_mean ~ mmt + scaled_age + has_readme + has_contrib, data=overall_data) +model_summarized <- summary(mmtmodel2) +coef <- coef(mmtmodel2) +qqnorm(residuals(mmtmodel2)) +overall_data$predict <- overall_data$mmt * model_summarized$coefficients[2,1] + model_summarized$coefficients[1,1] +overall_data$SE <- predict.lm(mmtmodel2, se.fit = TRUE, level = 0.95)$se.fit +p <- ggplot(data=overall_data, aes(x=mmt, y=underproduction_mean)) + + geom_ribbon(aes(x=mmt, ymin= predict-SE, ymax = predict+SE), fill = "green") + + geom_abline(intercept=coef[1], slope = coef[2], color = "red") + + theme_bw() +p -all_mmt_outcome_model <- lm(mmt ~ scaled_age + as.factor(has_readme) + as.factor(has_contrib), data = overall_data) -summary(all_mmt_outcome_model) - -govdoc_issuesmmt <- lm(issue_mmt ~ scaled_age + as.factor(has_readme) + as.factor(has_contrib), data=octo_data) -summary(govdoc_issuesmmt) library(texreg) #my little "lib" diff --git a/R/documentReadabilityAnalysis.R b/R/documentReadabilityAnalysis.R index 2cec261..31ae3d3 100644 --- a/R/documentReadabilityAnalysis.R +++ b/R/documentReadabilityAnalysis.R @@ -8,9 +8,9 @@ try(setwd(dirname(rstudioapi::getActiveDocumentContext()$path))) readme_df <- read_csv("../text_analysis/draft_readability_readme.csv") contributing_df <- read_csv("../text_analysis/draft_readability_contributing.csv") head(readme_df) -aggregate(readme_df[, 3:10], list(readme_df$subdir), mean) +aggregate(readme_df[, 3:10], list(readme_df$subdir), median) #readme_df <- readme_df |> # mutate(coef_grouping <- as.factor(subdir)) #test_lm <- lm(mcalpine_eflaw ~ word_count + as.factor(subdir),data=readme_df) #summary(test_lm) -aggregate(contributing_df[, 3:10], list(contributing_df$subdir), mean) +aggregate(contributing_df[, 3:10], list(contributing_df$subdir), median) diff --git a/R/draft_large_lm_plot.png b/R/draft_large_lm_plot.png new file mode 100644 index 0000000..5d1e380 Binary files /dev/null and b/R/draft_large_lm_plot.png differ diff --git a/final_data/deb_octo_data.csv b/final_data/deb_octo_data.csv index 31c57a5..c5a146f 100644 --- a/final_data/deb_octo_data.csv +++ b/final_data/deb_octo_data.csv @@ -1,3061 +1,2767 @@ -"project_name","underproduction_mean","underproduction_low","underproduction_high","debian_vcs_link","upstream_vcs_link","age_of_project","contributors","collaborators","milestone_count","api_contrib_count","issue_contrib_count","file_contrib_count","wiki_contrib_count","total_contrib","new.age","new.age.factor","mmt","issue_mmt" -"0xFFFF",-0.510168673,1.4527994311,-1.0011708662,"https://salsa.debian.org/debian/0xffff","https://github.com/pali/0xFFFF",5557.8427777778,3,11,0,6,9,0,0,9,4,"4",1.78571428571429,2 -"3270font",0.7956265926,4.3574626903,-0.214217071,"https://github.com/kilobyte/3270font/tree/debian","https://github.com/kilobyte/3270font",3596.6082060185,6,15,0,9,3,0,0,11,2,"2",1.71428571428571,1.27272727272727 -"4pane-debian-dir",-0.2426279425,2.299894807,-0.8194220994,"https://github.com/dghart/4pane-debian-dir/tree/master/","https://github.com/dghart/4pane-debian-dir",2236.6859722222,0,2,0,1,2,0,0,2,1,"1",2,2 -"4ti2",0.4764408337,3.0285400273,-0.2191943656,"https://salsa.debian.org/math-team/4ti2","https://github.com/4ti2/4ti2.git",5656.5603819445,3,11,0,6,18,0,0,18,4,"4",1.78571428571429,2 -"6tunnel",-0.563131582,0.346490728,-0.8398599484,"https://salsa.debian.org/debian/6tunnel","https://github.com/wojtekka/6tunnel",2673.0241203704,1,7,0,5,18,0,1,19,1,"1",1.875,1.94736842105263 -"a2jmidid",0.3594669173,1.948434404,-0.1562277334,"https://salsa.debian.org/multimedia-team/a2jmidid","https://github.com/linuxaudio/a2jmidid.git",4551.7947916667,8,8,0,12,23,0,0,27,3,"3",1.5,1.85185185185185 -"abGate",0.1706833434,2.3128885166,-0.4447167424,"https://salsa.debian.org/multimedia-team/abgate","https://github.com/antanasbruzas/abGate.git",1677.5786226852,2,8,0,4,5,0,0,6,1,"1",1.8,1.83333333333333 -"link",0.2419062498,3.4521460543,-0.7141549374,"https://salsa.debian.org/multimedia-team/ableton-link","https://github.com/Ableton/link.git",2835.8410648148,20,10,0,19,81,0,0,88,2,"2",1.33333333333333,1.92045454545455 -"acme-tiny",-0.0997740414,0.6982852517,-0.3572560835,"https://salsa.debian.org/letsencrypt-team/acme-tiny","https://github.com/diafygi/acme-tiny.git",2161.2252314815,7,34,0,36,354,0,0,355,1,"1",1.82926829268293,1.99718309859155 -"acpi_call",0.1056920793,1.3196660142,-0.2309830486,"https://salsa.debian.org/moonsweep/acpi-call","https://github.com/nix-community/acpi_call.git",4711.2498958333,14,26,0,29,24,0,0,39,3,"3",1.65,1.61538461538462 -"adapta-kde",-0.0885623802,2.0889906357,-0.5313636783,"https://salsa.debian.org/debian/adapta-kde","https://github.com/PapirusDevelopmentTeam/adapta-kde.git",636.9053819444,2,5,0,3,0,0,0,3,1,"1",1.71428571428571,1 -"admesh",0.1260876875,1.8100481532,-0.381631879,"https://salsa.debian.org/science-team/admesh","https://github.com/admesh/admesh",3319.1463078704,15,9,1,20,42,0,0,44,2,"2",1.375,1.95454545454545 -"ADMS",-0.6746373026,2.0836908399,-1.2638452949,"https://salsa.debian.org/science-team/adms","https://github.com/Qucs/ADMS.git",3397.3394444445,6,10,0,12,44,0,3,49,2,"2",1.625,1.89795918367347 -"ADOL-C",-0.218347665,0.2989988071,-0.4200973016,"https://salsa.debian.org/science-team/adolc","https://github.com/coin-or/ADOL-C",5292.5953472222,11,44,0,11,43,0,2,48,4,"4",1.8,1.89583333333333 -"taplib",-0.1607320251,2.2507776056,-0.6544297324,"https://salsa.debian.org/debian-astro-team/adql","https://github.com/gmantele/taplib.git",3533.9449074074,2,12,0,7,26,0,0,26,2,"2",1.85714285714286,2 -"adwaita-qt",0.205201025,2.3560485193,-0.2873294601,"https://salsa.debian.org/debian/adwaita-qt","https://github.com/FedoraQt/adwaita-qt.git",3324.8509953704,3,11,0,9,135,0,0,137,2,"2",1.78571428571429,1.98540145985401 -"aeskulap",-0.0079946864,0.7360602484,-0.280025211,"https://salsa.debian.org/med-team/aeskulap","https://github.com/pipelka/aeskulap.git",0.1217013889,0,2,0,2,3,0,0,4,1,"1",2,1.75 -"afew",-0.174094467,3.0914363808,-1.0829316549,"https://salsa.debian.org/python-team/packages/afew","https://github.com/afewmail/afew",4444.5631134259,14,62,1,59,188,0,0,190,3,"3",1.81578947368421,1.98947368421053 -"AFFLIBv3",0.4855383072,1.2966231457,0.0866885423,"https://salsa.debian.org/pkg-security-team/afflib","https://github.com/sshock/AFFLIBv3",3923.2419675926,1,18,0,14,23,0,0,28,3,"3",1.94736842105263,1.82142857142857 -"afio",0.7471975104,2.0817065146,0.0678453147,"https://salsa.debian.org/debian/afio","https://github.com/kholtman/afio",3009.1574652778,0,6,0,4,8,0,0,8,2,"2",2,2 -"AFLplusplus",-0.6866375311,2.5698791713,-1.4766466472,"https://salsa.debian.org/pkg-security-team/aflplusplus","https://github.com/AFLplusplus/AFLplusplus.git",1658.7534375,94,190,0,201,0,0,0,201,1,"1",1.66901408450704,1 -"aggdraw",-1.0738283571,1.0896722547,-1.5311943301,"https://salsa.debian.org/debian-gis-team/aggdraw","https://github.com/pytroll/aggdraw",4403.4778240741,4,15,2,15,48,0,0,49,3,"3",1.78947368421053,1.97959183673469 -"aha",-0.0329000287,2.2809487303,-0.5337481366,"https://salsa.debian.org/debian/aha","https://github.com/theZiz/aha.git",3422.3746180556,1,26,0,18,0,0,1,19,2,"2",1.96296296296296,1 -"aiodns",0.1656826228,1.9021756708,-0.2783622395,"https://salsa.debian.org/python-team/packages/aiodns","https://github.com/saghul/aiodns.git",3490.3476273148,13,17,0,27,96,0,0,100,2,"2",1.56666666666667,1.96 -"aioprocessing",-1.8106172723,-0.4031506429,-2.0700475194,"https://github.com/davesteele/aioprocessing","https://github.com/davesteele/aioprocessing",3054.801087963,3,13,0,8,1,0,0,8,2,"2",1.8125,1.125 -"airspyone_host",0.135032826,1.7638004482,-0.2266634267,"https://salsa.debian.org/bottoms/pkg-airspy-host","https://github.com/airspy/airspyone_host.git",3592.9147685185,9,15,0,21,60,0,6,68,2,"2",1.625,1.88235294117647 -"airspyhf",0.4277792447,3.1863173209,-0.2431051192,"https://salsa.debian.org/debian-hamradio-team/airspyhf","https://github.com/airspy/airspyhf.git",2334.5221527778,3,13,0,13,36,0,0,38,1,"1",1.8125,1.94736842105263 -"aiscm",-2.1266027747,-0.9022998492,-2.4482757524,"https://github.com/wedesoft/aiscm","https://github.com/wedesoft/aiscm",3606.1918865741,0,8,0,3,7,0,0,8,2,"2",2,1.875 -"alabaster",1.5840034231,5.0180871348,0.3754116681,"https://github.com/jbouse-debian/alabaster","https://github.com/jbouse-debian/alabaster",3086.3917592593,1,6,0,4,4,0,0,5,2,"2",1.85714285714286,1.8 -"amavisd-milter",0.615386065,3.5879174633,-0.470593397,"https://salsa.debian.org/debian/amavisd-milter","https://github.com/prehor/amavisd-milter",5582.9392824074,1,5,0,3,7,0,0,7,4,"4",1.83333333333333,2 -"amazon-ecr-credential-helper",-1.2935017996,1.3375714894,-1.8855602579,"https://github.com/awslabs/amazon-ecr-credential-helper/tree/debian","https://github.com/awslabs/amazon-ecr-credential-helper",2759.7970717593,31,49,1,56,371,0,0,396,2,"2",1.6125,1.93686868686869 -"amora",-0.6385985537,1.533812873,-1.3373354269,"https://github.com/amora/amora/tree/master/amora-server","https://github.com/amora/amora",4404.2341666667,0,11,0,6,5,0,0,9,3,"3",2,1.55555555555556 -"amsynth",0.3306364812,1.2209617467,-0.1269359447,"https://salsa.debian.org/multimedia-team/amsynth","https://github.com/nixxcode/amsynth.git",5332.9271990741,11,24,0,21,100,0,3,109,4,"4",1.68571428571429,1.91743119266055 -"amule",0.4839430086,0.6876326423,0.3238736448,"https://salsa.debian.org/debian/amule","https://github.com/amule-project/amule.git",5047.6080555556,11,25,0,16,46,0,0,55,4,"4",1.69444444444444,1.83636363636364 -"amule-emc",-0.3584249255,1.8578303929,-0.8058880504,"https://salsa.debian.org/morph/amule-emc","https://github.com/palopezv/amule-emc",2735.137662037,0,2,0,0,1,0,0,1,1,"1",2,2 -"analog-ce",0.3100100337,0.6308951381,0.1129534728,"https://salsa.debian.org/debian/analog","https://github.com/c-amie/analog-ce.git",798.2990509259,2,1,0,1,4,0,0,5,1,"1",1.33333333333333,1.8 -"anfo",-0.5164343879,1.1141228746,-0.8858012402,"https://salsa.debian.org/med-team/anfo","https://github.com/udo-stenzel/anfo",2083.7738310185,0,5,0,1,1,0,1,2,1,"1",2,1.5 -"anomaly",-2.6979232432,-0.9294432931,-3.0157661638,"https://github.com/mogaal/anomaly","https://github.com/mogaal/anomaly",224.8161226852,0,2,0,1,2,0,0,3,1,"1",2,1.66666666666667 -"anosql",-1.7531962484,0.6178873531,-2.3213037286,"https://salsa.debian.org/python-team/packages/anosql","https://github.com/honza/anosql",2207.9932523148,1,18,0,12,24,0,0,24,1,"1",1.94736842105263,2 -"ansible-lint",0.2113200286,2.3970134545,-0.4192549848,"https://salsa.debian.org/python-team/packages/ansible-lint","https://github.com/ansible/ansible-lint",3772.1254976852,239,77,4,263,0,0,0,263,3,"3",1.24367088607595,1 -"antpm",-0.4257977771,1.2499417918,-0.9097264377,"https://salsa.debian.org/debian/antpm","https://github.com/ralovich/antpm",5246.6502893519,2,16,0,6,4,0,0,7,4,"4",1.88888888888889,1.57142857142857 -"anypaper",-0.8366781332,1.8293957466,-1.525331321,"https://github.com/mogaal/anypaper","https://github.com/mogaal/anypaper",358.8230671296,0,1,0,1,0,0,0,1,1,"1",2,1 -"aoeui",-1.5753745078,-0.1018330597,-2.0145689052,"https://salsa.debian.org/debian/aoeui","https://github.com/pklausler/aoeui.git",0.0311342593,0,4,0,1,2,0,0,3,1,"1",2,1.66666666666667 -"apachetop",-0.1433968655,0.1384791106,-0.2436187019,"https://salsa.debian.org/debian/apachetop","https://github.com/tessus/apachetop.git",4171.4287847222,1,5,0,3,11,0,0,12,3,"3",1.83333333333333,1.91666666666667 -"apel",-0.1699911676,0.0467119457,-0.2503884599,"https://salsa.debian.org/debian/apel","https://github.com/wanderlust/apel",5064.9154166667,2,8,0,5,0,0,0,5,4,"4",1.8,1 -"apipkg",0.1848523093,2.3386412167,-0.297646363,"https://salsa.debian.org/python-team/packages/apipkg","https://github.com/pytest-dev/apipkg",4796.3536574074,4,14,0,15,32,0,0,36,3,"3",1.77777777777778,1.88888888888889 -"aplpy",-0.0173305787,1.6394741457,-0.5266587065,"https://salsa.debian.org/debian-astro-team/aplpy","https://github.com/aplpy/aplpy.git",4761.8146296296,3,44,0,33,0,0,1,34,3,"3",1.93617021276596,1 -"appdirs",0.3458277639,1.9577727359,-0.1122252661,"https://salsa.debian.org/python-team/packages/appdirs","https://github.com/ActiveState/appdirs.git",4580.7970601852,5,36,0,28,143,0,0,144,3,"3",1.8780487804878,1.99305555555556 -"appstream-generator",-1.1332713071,-0.1060546301,-1.4824521416,"https://salsa.debian.org/pkgutopia-team/appstream-generator","https://github.com/ximion/appstream-generator",2846.9885185185,14,5,0,14,47,0,0,47,2,"2",1.26315789473684,2 -"apriltag",-1.1179244852,1.091725818,-1.6047836993,"https://salsa.debian.org/science-team/apriltag","https://github.com/AprilRobotics/apriltag.git",1884.0502083333,21,28,0,42,0,0,0,42,1,"1",1.57142857142857,1 -"aprsdigi",0.1781157768,2.7404004262,-0.7343395696,"https://salsa.debian.org/debian-hamradio-team/aprsdigi","https://github.com/n2ygk/aprsdigi.git",5178.2461574074,2,9,0,4,7,0,0,7,4,"4",1.81818181818182,2 -"aprx",-0.2704326877,2.1233467944,-0.9280144637,"https://salsa.debian.org/debian-hamradio-team/aprx","https://github.com/PhirePhly/aprx",4964.0779861111,6,4,1,7,43,0,0,43,3,"3",1.4,2 -"apt-forktracer",0.0547352043,1.112259075,-0.2401275584,"https://github.com/porridge/apt-forktracer","https://github.com/porridge/apt-forktracer",5457.9246990741,1,3,0,2,1,0,0,2,4,"4",1.75,1.5 -"apt-offline",0.7681910278,1.8077281258,0.1487399152,"https://github.com/rickysarraf/apt-offline","https://github.com/rickysarraf/apt-offline",5588.93,4,18,3,12,62,0,2,69,4,"4",1.81818181818182,1.89855072463768 -"apt-venv",0.5985278149,4.8192892935,-0.7291864283,"https://salsa.debian.org/debian/apt-venv","https://github.com/LeoIannacone/apt-venv",1672.1250694445,0,3,0,1,7,0,0,7,1,"1",2,2 -"aptitude-robot",0.0330441368,2.6987643495,-0.6758866251,"https://github.com/elmar/aptitude-robot","https://github.com/elmar/aptitude-robot",3822.3247685185,3,7,1,6,9,0,0,10,3,"3",1.7,1.9 -"apulse-debian",-0.1771724569,1.2997369797,-0.4576897761,"https://github.com/exaexa/apulse-debian","https://github.com/exaexa/apulse-debian",2693.7106712963,2,11,0,9,2,0,0,9,1,"1",1.84615384615385,1.22222222222222 -"apvlv",0.8026186076,2.4912926837,-0.0110446926,"https://salsa.debian.org/debian/apvlv","https://github.com/naihe2010/apvlv",4571.1944675926,1,28,0,18,92,0,0,94,3,"3",1.96551724137931,1.97872340425532 -"arachne-pnr",-0.2393988119,0.9055823033,-0.5128499486,"https://salsa.debian.org/science-team/arachne-pnr","https://github.com/cseed/arachne-pnr.git",1523.5826388889,1,29,0,24,90,0,0,91,1,"1",1.96666666666667,1.98901098901099 -"ArbiterJS",-0.9372250205,1.3094171556,-1.3679284559,"https://salsa.debian.org/js-team/arbiterjs","https://github.com/ArbiterJS/ArbiterJS",777.6784722222,0,1,0,0,0,0,0,0,1,"1",2,NA -"arc",1.0034305192,2.95692526,0.1704629703,"https://git.hadrons.org/cgit/debian/pkgs/arc.git","https://github.com/ani6al/arc",0.1011921296,1,1,0,1,0,0,0,1,1,"1",1.5,1 -"arc-theme",0.0557512099,0.9470106383,-0.1788662281,"https://github.com/UbuntuBudgie/arc-theme/tree/debian","https://github.com/UbuntuBudgie/arc-theme",2773.5425578704,36,30,0,2,2,0,0,3,2,"2",1.45454545454545,1.66666666666667 -"arch-test",0.0607618911,0.902121307,-0.1116504733,"https://github.com/kilobyte/arch-test/tree/debian","https://github.com/kilobyte/arch-test",2721.0558912037,2,7,0,6,10,0,0,10,1,"1",1.77777777777778,2 -"archmage",-0.5766750111,-0.3037651495,-0.666439779,"https://salsa.debian.org/python-team/packages/archmage","https://github.com/dottedmag/archmage",4875.1846412037,1,4,0,3,16,0,0,16,3,"3",1.8,2 -"arcp-py",-5.0400309655,-2.6837801512,-5.4802256243,"https://salsa.debian.org/python-team/packages/arcp","https://github.com/stain/arcp-py.git",744.5613194444,0,3,0,2,4,0,0,4,1,"1",2,2 -"ardentryst",1.6336595561,4.7901963616,0.4114961199,"https://salsa.debian.org/games-team/ardentryst","https://github.com/ardentryst/ardentryst",3087.7143865741,4,6,0,6,7,0,0,7,2,"2",1.6,2 -"arename",-0.7754375198,0.9646514013,-1.1302132776,"https://salsa.debian.org/perl-team/modules/packages/arename","https://github.com/ft/arename.git",5509.5740972222,2,1,0,3,3,0,0,4,4,"4",1.33333333333333,1.75 -"phc-winner-argon2",0.743835667,2.5300173326,0.1203530186,"https://salsa.debian.org/pkg-security-team/argon2","https://github.com/P-H-C/phc-winner-argon2",2090.9970833333,21,70,0,62,101,0,0,123,1,"1",1.76923076923077,1.82113821138211 -"aif",-0.0994853605,0.2382471007,-0.2885738031,"https://salsa.debian.org/pkg-security-team/arno-iptables-firewall","https://github.com/arno-iptables-firewall/aif.git",5173.1893171296,1,13,0,3,50,0,0,50,4,"4",1.92857142857143,2 -"arp-scan",0.7973854024,2.157870748,0.1913515465,"https://salsa.debian.org/pkg-security-team/arp-scan","https://github.com/royhills/arp-scan",5689.2689583333,1,16,0,11,61,0,1,64,4,"4",1.94117647058824,1.953125 -"arpack-ng",0.3837318586,0.9028165971,0.1090371111,"https://salsa.debian.org/science-team/arpack","https://github.com/opencollab/arpack-ng.git",4374.6474884259,45,30,0,53,0,0,0,53,3,"3",1.4,1 -"arping",0.530645087,1.2970011805,0.131538231,"https://salsa.debian.org/debian/arping","https://github.com/ThomasHabets/arping",5640.3308564815,6,8,1,10,48,0,0,49,4,"4",1.57142857142857,1.97959183673469 -"assess",-1.4000321709,1.1332183932,-2.0278507888,"https://salsa.debian.org/emacsen-team/assess-el","https://github.com/phillord/assess.git",2948.0093402778,0,8,0,6,12,0,0,13,2,"2",2,1.92307692307692 -"astLib",-0.4953363519,0.6080154454,-0.6729060494,"https://salsa.debian.org/debian-astro-team/astlib","https://github.com/mattyowl/astLib.git",2666.6349305556,0,4,0,2,5,0,0,5,1,"1",2,2 -"astromenace",-0.4083684893,0.5804361033,-0.6175886343,"https://salsa.debian.org/games-team/astromenace","https://github.com/viewizard/astromenace.git",5567.4927893519,5,4,0,7,21,0,0,22,4,"4",1.44444444444444,1.95454545454545 -"astropy-healpix",-0.4944474025,0.2280631702,-0.7220614086,"https://salsa.debian.org/debian-astro-team/astropy-healpix","https://github.com/astropy/astropy-healpix",2653.9758333333,3,14,5,12,33,0,2,35,1,"1",1.82352941176471,1.94285714285714 -"atig",-1.8648493244,0.279641993,-2.4212366269,"https://salsa.debian.org/ruby-team/atig","https://github.com/atig/atig",4572.5188078704,2,14,1,10,17,0,0,17,3,"3",1.875,2 -"atlas-cpp",0.0341726983,1.1760438151,-0.4721381555,"https://salsa.debian.org/games-team/atlas-cpp","https://github.com/worldforge/atlas-cpp",5588.9221643519,1,7,0,7,9,0,0,11,4,"4",1.875,1.81818181818182 -"audacious-plugins",1.7224717183,2.5284554407,1.1638170855,"https://salsa.debian.org/multimedia-team/audacious-plugins","https://github.com/audacious-media-player/audacious-plugins",5769.3870138889,19,100,0,83,0,0,0,83,4,"4",1.84033613445378,1 -"audiofile",0.422362873,1.1370882832,0.0919717085,"https://salsa.debian.org/multimedia-team/audiofile","https://github.com/mpruett/audiofile",1573.8945023148,10,2,0,8,60,0,0,61,1,"1",1.16666666666667,1.98360655737705 -"austin",-1.9885885289,0.9749582973,-2.7198737394,"https://github.com/P403n1x87/austin","https://github.com/P403n1x87/austin",1837.728599537,4,7,8,7,31,0,1,34,1,"1",1.63636363636364,1.91176470588235 -"autocutsel-debian",0.1797843854,2.4764961713,-0.3873891003,"https://github.com/elmar/autocutsel-debian","https://github.com/elmar/autocutsel-debian",3741.7552430556,3,8,0,7,1,0,0,7,2,"2",1.72727272727273,1.14285714285714 -"autolog",-0.4586466955,0.5238636181,-1.0843460423,"https://salsa.debian.org/pkg-security-team/autolog","https://github.com/JKDingwall/autolog.git",1891.041099537,4,11,0,5,2,0,0,6,1,"1",1.73333333333333,1.33333333333333 -"automx-debian",-0.602057718,1.6606574872,-1.3781487507,"https://github.com/wreiner/automx-debian.git","https://github.com/wreiner/automx-debian.git",38.1884490741,1,1,0,1,0,0,0,1,1,"1",1.5,1 -"autopostgresqlbackup",0.0717331465,1.1779509822,-0.3973782275,"https://salsa.debian.org/kolter/autopostgresqlbackup","https://github.com/k0lter/autopostgresqlbackup",1670.5722222222,8,3,0,6,19,0,0,21,1,"1",1.27272727272727,1.9047619047619 -"autorenamer",-0.3876192426,1.6252404011,-0.8867624476,"https://github.com/porridge/autorenamer","https://github.com/porridge/autorenamer",3637.0090277778,4,1,0,1,3,0,0,3,2,"2",1.2,2 -"averell",-3.3917060035,-0.2624325775,-4.2312153625,"https://github.com/jeanparpaillon/averell","https://github.com/jeanparpaillon/averell",585.8797453704,0,1,0,0,2,0,0,2,1,"1",2,2 -"pkg-avr-evtd",0.7552713955,5.6393427141,-0.8294940805,"https://github.com/rbrito/pkg-avr-evtd","https://github.com/rbrito/pkg-avr-evtd",3784.5630787037,0,1,0,0,1,0,0,1,3,"3",2,2 -"awesfx",0.8705331012,2.216301783,0.1561432022,"https://salsa.debian.org/multimedia-team/awesfx","https://github.com/tiwai/awesfx.git",1324.8292592593,0,1,0,1,2,0,0,2,1,"1",2,2 -"biber",0.025597249,0.3975294935,-0.1139709408,"https://github.com/debian-tex/biber","https://github.com/debian-tex/biber",5232.9484259259,2,17,0,7,1,0,0,7,4,"4",1.89473684210526,1.14285714285714 -"biblesync",0.3250691142,3.3691024007,-0.4547464712,"https://salsa.debian.org/pkg-crosswire-team/biblesync","https://github.com/karlkleinpaste/biblesync.git",2205.1738773148,0,6,0,3,7,0,0,7,1,"1",2,2 -"bibtool",0.6789918484,1.7753249658,0.1299255999,"https://salsa.debian.org/tex-team/bibtool","https://github.com/ge-ne/bibtool.git",4734.0663541667,1,5,0,3,29,0,0,29,3,"3",1.83333333333333,2 -"binkd",-1.5291148732,-0.7208993868,-1.8984875134,"https://salsa.debian.org/md/binkd","https://github.com/pgul/binkd",5661.947349537,4,23,0,12,24,0,0,27,4,"4",1.85185185185185,1.88888888888889 -"bino",0.1952576502,1.8817060276,-0.4774605999,"https://github.com/schaal/bino","https://github.com/schaal/bino",3762.7609490741,0,4,0,2,1,0,0,2,2,"2",2,1.5 -"binwalk",0.2237508811,1.3345373481,-0.1513640072,"https://salsa.debian.org/pkg-security-team/binwalk","https://github.com/ReFirmLabs/binwalk",3364.812650463,24,70,1,71,16,0,25,105,2,"2",1.74468085106383,1.15238095238095 -"biometric-authentication",-0.485933223,1.5346031672,-1.0554082079,"https://github.com/ukui/biometric-authentication","https://github.com/ukui/biometric-authentication",1286.1941203704,2,8,0,4,14,0,0,14,1,"1",1.8,2 -"bitstruct",-1.0422111169,1.6758733437,-1.7408364383,"https://salsa.debian.org/python-team/packages/bitstruct","https://github.com/eerimoq/bitstruct",3110.3722916667,2,10,0,6,34,0,0,34,2,"2",1.83333333333333,2 -"blackboxwm",0.9240670694,1.5485949706,0.4955253,"https://salsa.debian.org/debian/blackbox","https://github.com/bbidulock/blackboxwm",5638.5930671296,4,7,0,8,24,0,0,27,4,"4",1.63636363636364,1.88888888888889 -"pkg-blahtexml",-0.8489779977,1.4826442088,-1.4663049964,"http://github.com/abhidg/pkg-blahtexml","http://github.com/abhidg/pkg-blahtexml",103.9986226852,0,1,0,0,0,0,0,0,1,"1",2,NA -"Bluebird",1.1380974193,4.2767964991,0.1562970087,"https://salsa.debian.org/desktop-themes-team/bluebird-gtk-theme","https://github.com/shimmerproject/Bluebird",2956.8580092593,3,16,0,11,26,0,0,27,2,"2",1.84210526315789,1.96296296296296 -"bmap-tools",-0.1504052056,1.1252732802,-0.4879151231,"https://salsa.debian.org/debian/bmap-tools","https://github.com/intel/bmap-tools",4042.2103240741,15,24,3,22,30,0,1,40,3,"3",1.61538461538462,1.75 -"boinctui",-0.1432413703,1.420786312,-0.5512115785,"https://github.com/suleman1971/boinctui","https://github.com/suleman1971/boinctui",3939.3302893519,1,7,0,5,21,0,0,21,3,"3",1.875,2 -"bootinfoscript",-0.3809313102,1.1240423783,-0.7082417318,"https://salsa.debian.org/debian/boot-info-script","https://github.com/arvidjaar/bootinfoscript",3172.7375,1,7,0,3,19,0,0,20,2,"2",1.875,1.95 -"booth",-2.5882433407,-1.3768010854,-2.9582924151,"https://salsa.debian.org/ha-team/booth","https://github.com/ClusterLabs/booth.git",4438.4447337963,6,37,0,22,34,0,0,41,3,"3",1.86046511627907,1.82926829268293 -"btchip-python",-1.1812672757,1.4023375583,-1.7414921007,"https://salsa.debian.org/python-team/packages/btchip-python","https://github.com/LedgerHQ/btchip-python.git",3019.8821180556,5,10,0,10,36,0,0,36,2,"2",1.66666666666667,2 -"btfs",-0.1692325715,2.6773757299,-0.8903422829,"https://salsa.debian.org/debian/btfs","https://github.com/johang/btfs",2774.3356481482,11,11,0,15,32,0,0,39,2,"2",1.5,1.82051282051282 -"bti",-0.2588997909,0.7195438277,-0.7283552221,"https://git.toastfreeware.priv.at/debian/bti.git","https://github.com/gregkh/bti.git",3076.6664699074,14,25,0,25,36,0,0,45,2,"2",1.64102564102564,1.8 -"btrbk-packaging",0.1156617148,2.2848637542,-0.5286650377,"https://github.com/digint/btrbk-packaging","https://github.com/digint/btrbk-packaging",2807.8996064815,1,3,0,1,4,0,0,4,2,"2",1.75,2 -"compsize",0.1058240849,2.8049694932,-0.4831458072,"https://github.com/kilobyte/compsize/tree/debian","https://github.com/kilobyte/compsize",1814.0231481482,0,8,0,7,52,0,0,52,1,"1",2,2 -"budgie-desktop",-0.3863909585,-0.1050655044,-0.4722349352,"https://github.com/ubuntubudgie/budgie-desktop/tree/debian","https://github.com/ubuntubudgie/budgie-desktop",3652.4221643519,35,69,1,5,47,0,0,48,2,"2",1.66346153846154,1.97916666666667 -"budgie-extras",-0.3549864205,1.918871211,-0.8848111475,"https://github.com/UbuntuBudgie/budgie-extras/tree/debian","https://github.com/UbuntuBudgie/budgie-extras",2299.353599537,13,15,6,20,6,0,0,24,1,"1",1.53571428571429,1.25 -"budgie-indicator-applet",-0.3165710056,1.8644335276,-0.7715039703,"https://github.com/UbuntuBudgie/budgie-indicator-applet/tree/debian","https://github.com/UbuntuBudgie/budgie-indicator-applet",2410.5153935185,0,6,1,2,24,0,0,24,1,"1",2,2 -"buildapp",-0.6306447633,1.6220492356,-1.3420391452,"https://salsa.debian.org/common-lisp-team/buildapp","https://github.com/xach/buildapp",2095.158275463,0,6,0,6,25,0,0,25,1,"1",2,2 -"bwm-ng",1.4012192264,3.1707005611,0.5566987616,"https://salsa.debian.org/debian/bwm-ng","https://github.com/vgropp/bwm-ng",5022.6577083333,1,12,0,7,29,0,0,30,4,"4",1.92307692307692,1.96666666666667 -"cafeobj",-1.8104313277,-1.0153734132,-2.0497300294,"https://github.com/CafeOBJ/cafeobj","https://github.com/CafeOBJ/cafeobj",3212.0939699074,0,7,0,3,3,0,2,7,2,"2",2,1.42857142857143 -"capnproto-debian",0.2688312178,0.9760274096,-0.0981830892,"https://github.com/thomaslee/capnproto-debian","https://github.com/thomaslee/capnproto-debian",3752.338587963,3,4,0,3,5,0,0,5,2,"2",1.57142857142857,2 -"carbon-c-relay",-1.7206703797,2.1186998142,-2.7912817518,"https://salsa.debian.org/debian/carbon-c-relay","https://github.com/grobian/carbon-c-relay.git",3376.0489467593,8,36,0,25,0,0,1,26,2,"2",1.81818181818182,1 -"CARE-debian",-0.2836237154,3.5038071749,-1.3460010784,"https://github.com/ivoire/CARE-debian","https://github.com/ivoire/CARE-debian",2.7190856481,0,2,0,1,1,0,0,2,1,"1",2,1.5 -"observatories-table",-0.1932098569,1.2412651155,-0.4565906785,"https://salsa.debian.org/debian-astro-team/casacore-data-observatories","https://github.com/casacore/observatories-table.git",766.9570138889,1,3,0,2,2,0,0,2,1,"1",1.75,2 -"cassbeam",-0.2590451087,0.999251768,-0.6449745997,"https://salsa.debian.org/debian-astro-team/cassbeam","https://github.com/ratt-ru/cassbeam",1099.9010185185,0,5,0,3,3,0,0,3,1,"1",2,2 -"casync",-1.0162004091,-0.313916552,-1.2265268627,"https://salsa.debian.org/systemd-team/casync","https://github.com/systemd/casync",2466.7584606482,38,15,0,44,38,0,0,69,1,"1",1.28301886792453,1.55072463768116 -"catcodec",-1.1685609799,1.0772762213,-1.6183880518,"https://salsa.debian.org/openttd-team/catcodec","https://github.com/OpenTTD/catcodec.git",4292.8177314815,2,4,0,3,2,0,0,3,3,"3",1.66666666666667,1.66666666666667 -"catimg",-0.0953582269,2.1605928046,-0.6844708001,"https://salsa.debian.org/debian/catimg","https://github.com/posva/catimg.git",3000.6790046296,7,14,0,12,58,0,0,58,2,"2",1.66666666666667,2 -"caveexpress",-0.4341110971,0.5694718441,-0.5965828946,"https://salsa.debian.org/games-team/caveexpress","https://github.com/mgerhardy/caveexpress",2582.468125,2,6,0,4,11,0,3,14,1,"1",1.75,1.78571428571429 -"Cavez-of-Phear-packaging",0.0722256397,3.4094980689,-0.7199285527,"https://github.com/haakonnessjoen/Cavez-of-Phear-packaging","https://github.com/haakonnessjoen/Cavez-of-Phear-packaging",23.0470601852,0,1,0,1,1,0,0,2,1,"1",2,1.5 -"cbatticon",-0.6634198756,2.0334034925,-1.2638833309,"https://salsa.debian.org/debian/cbatticon","https://github.com/valr/cbatticon.git",4175.7122800926,3,25,0,19,61,0,2,63,3,"3",1.89285714285714,1.96825396825397 -"cbflib",0.9354285947,4.3539203092,-0.1929526206,"https://salsa.debian.org/science-team/cbflib","https://github.com/yayahjb/cbflib",5636.0790740741,1,18,0,8,16,0,0,18,4,"4",1.94736842105263,1.88888888888889 -"cbm",0.2175441651,1.9827159385,-0.3872945166,"https://salsa.debian.org/debian/cbm","https://github.com/resurrecting-open-source-projects/cbm",918.9922337963,1,3,0,2,11,0,0,12,1,"1",1.75,1.91666666666667 -"ccbuild",-0.9629469603,0.1146367137,-1.3836463029,"https://salsa.debian.org/debian/ccbuild","https://github.com/bneijt/ccbuild.git",4764.8878703704,1,5,0,2,9,0,0,9,3,"3",1.83333333333333,2 -"cccc",1.1630655625,3.7723724067,0.0933849486,"https://salsa.debian.org/debian/cccc","https://github.com/sarnold/cccc",2703.0782638889,1,7,0,3,10,0,0,11,1,"1",1.875,1.90909090909091 -"ccd2iso-debian",0.361667663,2.3145122267,-0.2829342926,"https://github.com/paulproteus/ccd2iso-debian","https://github.com/paulproteus/ccd2iso-debian",10.0830555556,1,1,0,2,1,0,0,3,1,"1",1.5,1.33333333333333 -"cclive",0.3075023734,1.0246036879,-0.0680117934,"https://github.com/mogaal/cclive","https://github.com/mogaal/cclive",1632.909375,1,4,0,2,0,0,0,2,1,"1",1.8,1 -"cd-discid",0.6925316992,3.3171474044,-0.0825478541,"https://github.com/taem/cd-discid/tree/deb","https://github.com/taem/cd-discid",2591.0086574074,2,2,0,3,8,0,0,9,1,"1",1.5,1.88888888888889 -"cellwriter",1.0089121851,3.1682961137,-0.0123490019,"https://salsa.debian.org/debian/cellwriter","https://github.com/risujin/cellwriter",1174.0054050926,1,2,0,2,8,0,1,9,1,"1",1.66666666666667,1.88888888888889 -"cen64-debian",-0.0299112832,2.2614422439,-0.6566748344,"https://github.com/dh4/cen64-debian/","https://github.com/dh4/cen64-debian",1926.2346064815,0,5,0,3,1,0,0,3,1,"1",2,1.33333333333333 -"cen64-qt-debian",-0.752499837,1.4603763669,-1.3157313926,"https://github.com/dh4/cen64-qt-debian/","https://github.com/dh4/cen64-qt-debian",1637.4857986111,0,4,0,3,1,0,0,3,1,"1",2,1.33333333333333 -"centreon-clib",-3.2868334023,-0.8614963308,-3.7498045046,"https://salsa.debian.org/centreon-team/centreon-clib","https://github.com/centreon/centreon-clib.git",4179.8511458333,9,17,0,12,14,0,0,16,3,"3",1.65384615384615,1.875 -"certspotter",-1.0333689914,-0.0755768851,-1.2332167803,"https://salsa.debian.org/go-team/packages/certspotter","https://github.com/sslmate/certspotter",2838.7901736111,7,8,2,11,9,0,0,16,2,"2",1.53333333333333,1.5625 -"CeWL",-0.0142294382,1.8140197076,-0.3642449144,"https://salsa.debian.org/pkg-security-team/cewl","https://github.com/digininja/CeWL.git",2751.2389351852,7,13,0,13,22,0,0,31,2,"2",1.65,1.70967741935484 -"cgroupfs-mount",0.5950079509,2.246233345,0.0389645239,"https://github.com/tianon/cgroupfs-mount","https://github.com/tianon/cgroupfs-mount",2931.2437847222,0,7,0,5,13,0,0,15,2,"2",2,1.86666666666667 -"chafa",0.2729454746,2.5277999875,-0.1637443656,"https://salsa.debian.org/debian/chafa","https://github.com/hpjansson/chafa.git",2095.0478819445,25,6,0,27,29,0,1,49,1,"1",1.19354838709677,1.59183673469388 -"Chaosreader",0.051219731,1.9660310042,-0.36928528,"https://salsa.debian.org/pkg-security-team/chaosreader","https://github.com/brendangregg/Chaosreader",66.7731134259,0,4,0,3,13,0,0,13,1,"1",2,2 -"charls",0.0895204966,0.7433078443,-0.0746073455,"https://salsa.debian.org/med-team/charls","https://github.com/team-charls/charls.git",5412.7639236111,9,14,0,14,20,0,2,29,4,"4",1.60869565217391,1.68965517241379 -"cjk",0.9697104519,1.6795645993,0.5078842706,"https://github.com/debian-tex/cjk","https://github.com/debian-tex/cjk",4969.9469328704,1,7,0,4,2,0,0,4,3,"3",1.875,1.5 -"cjose",0.2954038942,3.3240815436,-0.6206035693,"https://salsa.debian.org/debian/cjose","https://github.com/zmartzone/cjose.git",2698.734525463,9,16,0,16,4,0,0,17,1,"1",1.64,1.23529411764706 -"cjs",0.3334254948,1.2158627921,-0.0031931609,"https://salsa.debian.org/cinnamon-team/cjs","https://github.com/linuxmint/cjs.git",3771.5652546296,71,77,0,93,33,0,0,114,3,"3",1.52027027027027,1.28947368421053 -"ckbuilder",-1.3486815873,1.7603160909,-2.1472801921,"https://salsa.debian.org/js-team/ckbuilder","https://github.com/ckeditor/ckbuilder.git",3366.2307291667,1,11,0,10,31,0,0,31,2,"2",1.91666666666667,2 -"cl-csv",-0.1843136147,2.282501642,-0.9607356223,"https://salsa.debian.org/common-lisp-team/cl-csv","https://github.com/AccelerationNet/cl-csv",3373.8361342593,0,10,0,9,30,0,0,30,2,"2",2,2 -"cl-ftp",-0.6205750271,2.0407172858,-1.4348634933,"https://github.com/pinterface/cl-ftp","https://github.com/pinterface/cl-ftp",3252.9678009259,1,3,0,2,5,0,0,6,2,"2",1.75,1.83333333333333 -"cl-github-v3",-0.5258867542,3.1486982913,-1.5778685827,"https://github.com/hanshuebner/cl-github-v3","https://github.com/hanshuebner/cl-github-v3",2986.6350810185,1,3,0,2,3,0,0,3,2,"2",1.75,2 -"ironclad",-0.2926194741,2.5462973619,-0.9228966528,"https://salsa.debian.org/common-lisp-team/cl-ironclad","https://github.com/sharplispers/ironclad",5005.7061458333,20,31,0,38,63,0,0,79,4,"4",1.6078431372549,1.79746835443038 -"local-time",-0.1155735019,3.1988484402,-1.0582604602,"http://github.com/dlowe-net/local-time","http://github.com/dlowe-net/local-time",5698.7149884259,7,50,0,0,0,0,0,0,4,"4",1.87719298245614,NA -"lparallel",-0.3212127102,2.5346068068,-1.0978335516,"https://github.com/lmj/lparallel","https://github.com/lmj/lparallel",2019.918599537,0,5,0,4,49,0,0,49,1,"1",2,2 -"cl-markdown",-0.704735028,1.4518477641,-1.1406727407,"https://github.com/gwkkwg/cl-markdown","https://github.com/gwkkwg/cl-markdown",5675.8904513889,2,4,0,3,15,0,0,16,4,"4",1.66666666666667,1.9375 -"debian-coinor-ipopt",0.5832138621,1.8467840552,-0.023431241,"https://github.com/ghorn/debian-coinor-ipopt.git","https://github.com/ghorn/debian-coinor-ipopt.git",39.8457986111,1,2,0,3,6,0,0,7,1,"1",1.66666666666667,1.85714285714286 -"coinst",-2.1191156396,-0.1758133987,-2.7007167402,"https://salsa.debian.org/ocaml-team/coinst","https://github.com/vouillon/coinst",2037.998599537,0,10,0,3,4,0,0,5,1,"1",2,1.8 -"CoinUtils",0.5173058529,1.7235167137,0.083670866,"https://salsa.debian.org/science-team/coinutils","https://github.com/coin-or/CoinUtils",5778.8880671296,5,20,0,19,32,0,0,42,4,"4",1.8,1.76190476190476 -"collada-dom",0.691454203,3.6624920638,-0.1343215008,"https://salsa.debian.org/science-team/collada-dom","https://github.com/rdiankov/collada-dom",2502.5084606482,0,12,0,6,37,0,0,37,1,"1",2,2 -"colord-gtk",0.7697552931,2.9826639125,0.077041879,"https://salsa.debian.org/debian/colord-gtk","https://github.com/hughsie/colord-gtk.git",4151.4261111111,7,4,0,8,20,0,0,21,3,"3",1.36363636363636,1.95238095238095 -"Colormake",0.4957489072,1.6979687579,-0.1003336178,"https://salsa.debian.org/debian/colormake","https://github.com/pagekite/Colormake",1830.1740162037,0,12,0,7,19,0,0,20,1,"1",2,1.95 -"colorspacious",-0.5821614466,2.0041319598,-1.1596382365,"https://salsa.debian.org/python-team/packages/colorspacious","https://github.com/njsmith/colorspacious.git",1894.8289351852,2,10,0,9,30,0,0,33,1,"1",1.83333333333333,1.90909090909091 -"terminal-colors",-0.3857845184,0.9188572345,-0.8063133571,"https://salsa.debian.org/python-team/packages/colortest-python","https://github.com/eikenb/terminal-colors",4692.3352777778,1,2,0,2,11,0,0,11,3,"3",1.66666666666667,2 -"ColPack",0.2017867043,1.9302260292,-0.3695903388,"https://salsa.debian.org/science-team/colpack","https://github.com/CSCsw/ColPack",1916.7757175926,1,22,0,9,0,0,0,9,1,"1",1.95652173913043,1 -"CommonMark-py",-0.1141650084,1.2511686194,-0.3702327483,"https://salsa.debian.org/python-team/packages/commonmark-bkrs","https://github.com/rolandshoemaker/CommonMark-py",472.4580902778,0,5,0,4,23,0,0,24,1,"1",2,1.95833333333333 -"concordance",-0.4625050573,0.3139503984,-0.7573354842,"https://salsa.debian.org/debian/concordance","https://github.com/jaymzh/concordance.git",5701.1186458333,1,3,0,2,16,0,0,16,4,"4",1.75,2 -"config-package-dev",-0.2056225256,1.2522724234,-0.6633860362,"https://github.com/sipb/config-package-dev","https://github.com/sipb/config-package-dev",3585.0969444445,4,6,0,9,9,0,0,16,2,"2",1.6,1.5625 -"ssh-connect",0.6639299634,3.4943269761,-0.2623886668,"https://salsa.debian.org/debian/connect-proxy","https://github.com/gotoh/ssh-connect",3911.0326273148,0,6,0,3,7,0,0,9,3,"3",2,1.77777777777778 -"workbench",0.0811043258,2.6788022329,-0.7528644786,"http://github.com/neurodebian/workbench","http://github.com/neurodebian/workbench",3495.7424652778,3,16,0,0,0,0,0,0,2,"2",1.84210526315789,NA -"conserver",-0.5522688783,0.0570588023,-0.8821891544,"https://salsa.debian.org/debian/conserver","https://github.com/conserver/conserver.git",4671.668912037,1,15,0,9,21,0,0,23,3,"3",1.9375,1.91304347826087 -"constantly",0.8509284475,3.7618528736,0.0151388634,"https://salsa.debian.org/python-team/packages/constantly","https://github.com/twisted/constantly.git",2708.6915162037,2,14,0,8,30,0,0,30,1,"1",1.875,2 -"context",0.3449326884,0.8438807473,0.0662940568,"https://github.com/debian-tex/context","https://github.com/debian-tex/context",5666.6297800926,2,10,0,4,3,0,0,4,4,"4",1.83333333333333,1.75 -"context-modules",0.2805651463,2.5200169996,-0.1441758839,"https://github.com/debian-tex/context-modules","https://github.com/debian-tex/context-modules",4444.3460763889,3,7,0,4,3,0,0,4,3,"3",1.7,1.75 -"context-free",-0.3442355768,0.7562945788,-0.8321584754,"https://github.com/MtnViewJohn/context-free","https://github.com/MtnViewJohn/context-free",2911.319537037,1,9,0,3,27,0,9,36,2,"2",1.9,1.75 -"ConvertAll",0.1771895993,1.8709004223,-0.3855879122,"https://salsa.debian.org/qt-kde-team/extras/convertall","https://github.com/doug-101/ConvertAll.git",72.0215277778,1,2,0,1,0,0,0,1,1,"1",1.66666666666667,1 -"convertdate",-1.0779704926,1.5263503581,-1.6372696683,"https://salsa.debian.org/python-team/packages/convertdate","https://github.com/fitnr/convertdate",2873.5651041667,10,11,0,11,44,0,0,45,2,"2",1.52380952380952,1.97777777777778 -"project--copyright-update",-0.5521971605,1.8066389929,-1.1431761187,"https://salsa.debian.org/debian/copyright-update","https://github.com/jaalto/project--copyright-update",3367.8622453704,0,1,0,1,0,0,0,1,2,"2",2,1 -"core.cache",-0.5610215639,2.4088514058,-1.3030738883,"https://salsa.debian.org/clojure-team/core-cache-clojure","https://github.com/clojure/core.cache",4284.5170138889,8,15,0,13,17,0,18,44,3,"3",1.65217391304348,1.38636363636364 -"cruft",1.801661645,2.7360925805,1.1501879975,"https://github.com/a-detiste/cruft","https://github.com/a-detiste/cruft",5211.5065740741,2,8,0,7,3,0,0,7,4,"4",1.8,1.42857142857143 -"cruft-ng",0.142059124,2.3097088035,-0.5171739502,"https://github.com/a-detiste/cruft-ng","https://github.com/a-detiste/cruft-ng",3368.4031018519,2,10,0,10,11,0,1,13,2,"2",1.83333333333333,1.84615384615385 -"cryfs",-0.1323512993,0.8693806221,-0.3694530273,"https://github.com/davesteele/cryfs","https://github.com/davesteele/cryfs",3180.9594560185,28,15,0,27,1,0,0,27,2,"2",1.34883720930233,1.03703703703704 -"CTDConverter",-2.8525515304,-0.4549866674,-3.3207596251,"https://salsa.debian.org/med-team/ctdconverter","https://github.com/WorkflowConversion/CTDConverter",2616.9146180556,5,13,0,9,15,0,0,15,1,"1",1.72222222222222,2 -"cupt",-0.7851662489,-0.7413560004,-0.8102098137,"https://github.com/jackyf/cupt/tree/master","https://github.com/jackyf/cupt",3964.469525463,4,7,0,6,9,0,1,14,3,"3",1.63636363636364,1.64285714285714 -"curvedns",-1.1461706987,0.1127414426,-1.3738129892,"https://salsa.debian.org/pkg-security-team/curvedns","https://github.com/curvedns/curvedns.git",3466.7757291667,0,3,0,2,9,0,0,9,2,"2",2,2 -"cwm",-0.5002044281,1.5042184567,-0.9352825389,"https://github.com/jamesmcdonald/cwm","https://github.com/jamesmcdonald/cwm",5679.8960532407,1,30,0,0,1,0,0,1,4,"4",1.96774193548387,2 -"cycle",-0.313126049,0.6954651903,-0.7844178818,"https://salsa.debian.org/med-team/cycle","https://github.com/metlov/cycle.git",229.9525347222,0,1,0,1,0,0,0,1,1,"1",2,1 -"project--perl-ddir",-0.9126372061,1.4246841106,-1.4714839475,"https://salsa.debian.org/debian/ddir","https://github.com/jaalto/project--perl-ddir.git",3338.2834722222,0,1,0,1,2,0,0,2,2,"2",2,2 -"debomatic",-0.8158097197,-0.1371156791,-1.0821998073,"https://salsa.debian.org/python-team/packages/debomatic","https://github.com/debomatic/debomatic",5739.495,4,16,0,13,18,0,0,22,4,"4",1.8,1.81818181818182 -"debootstick",-0.5087170385,0.8382307544,-0.8815589055,"https://github.com/drakkar-lig/debootstick","https://github.com/drakkar-lig/debootstick",3036.0772106482,5,8,0,8,20,0,2,23,2,"2",1.61538461538462,1.8695652173913 -"debian-debuerreotype",-1.063173434,1.4648781183,-1.6297873496,"https://github.com/debuerreotype/debian-debuerreotype","https://github.com/debuerreotype/debian-debuerreotype",2712.8558217593,0,4,0,2,2,0,0,3,1,"1",2,1.66666666666667 -"deepin-notifications",0.3474442725,3.6547785603,-0.4321808993,"https://salsa.debian.org/pkg-deepin-team/deepin-notifications","https://github.com/linuxdeepin/deepin-notifications",2025.0469791667,4,26,0,14,18,0,0,30,1,"1",1.86666666666667,1.6 -"dicteval",-2.9536986334,-0.1320875709,-3.6889555809,"https://salsa.debian.org/debian/dicteval","https://github.com/osantana/dicteval.git",1110.6433217593,3,12,0,10,14,0,0,14,1,"1",1.8,2 -"ding-libs",0.3833422556,2.4936424716,-0.1381470129,"https://salsa.debian.org/sssd-team/ding-libs","https://github.com/SSSD/ding-libs",5249.6200810185,15,12,0,14,16,0,0,23,4,"4",1.44444444444444,1.69565217391304 -"dir2ogg",0.2396946845,1.641521491,-0.3190929184,"https://github.com/julian-klode/dir2ogg","https://github.com/julian-klode/dir2ogg",1310.0299884259,1,5,1,3,9,0,0,10,1,"1",1.83333333333333,1.9 -"direnv-deb",-0.006884838,1.7585706473,-0.4511605857,"https://github.com/direnv/direnv-deb","https://github.com/direnv/direnv-deb",3256.5212847222,1,6,0,1,1,0,0,2,2,"2",1.85714285714286,1.5 -"node-dirty",-0.8909885733,2.6227016495,-1.9512157567,"https://salsa.debian.org/js-team/dirty.js","https://github.com/felixge/node-dirty.git",4940.3282175926,7,21,0,20,52,0,0,53,3,"3",1.75,1.9811320754717 -"discus",1.1705020939,3.7454601144,0.0821077036,"https://salsa.debian.org/debian/discus","https://github.com/ncarrier/discus.git",1119.0192592593,0,4,0,1,3,0,0,3,1,"1",2,2 -"diskscan",-0.2808442196,0.3836383801,-0.4193484695,"https://salsa.debian.org/debian/diskscan","https://github.com/baruch/diskscan.git",1436.448587963,0,3,0,3,32,0,0,32,1,"1",2,2 -"ditaa",1.1445611741,3.5538586753,0.1428331298,"https://salsa.debian.org/java-team/ditaa","https://github.com/stathissideris/ditaa",4647.8960416667,3,17,0,12,73,0,0,74,3,"3",1.85,1.98648648648649 -"dizzy",0.5207937556,2.8020455015,-0.2161435151,"https://salsa.debian.org/perl-team/modules/packages/dizzy","https://github.com/penma/dizzy.git",1717.3470949074,4,6,0,4,1,0,0,5,1,"1",1.6,1.2 -"django-bitfield",-1.1647703491,1.6767739512,-1.9098342392,"https://salsa.debian.org/python-team/packages/django-bitfield","https://github.com/disqus/django-bitfield",4482.6217939815,15,33,0,35,84,0,0,98,3,"3",1.6875,1.85714285714286 -"django-cas-server",-1.308896058,2.2292815551,-2.3158506417,"https://salsa.debian.org/python-team/packages/django-cas-server","https://github.com/nitmir/django-cas-server.git",3041.6335532407,8,9,0,13,46,0,0,47,2,"2",1.52941176470588,1.97872340425532 -"pkg-django-compat",-1.3241602951,-0.1886083427,-1.7657341927,"https://github.com/Linaro/pkg-django-compat.git","https://github.com/Linaro/pkg-django-compat.git",1206.0878819445,0,6,0,3,3,0,0,3,1,"1",2,2 -"django-cors-headers",-1.1139410876,0.0671040287,-1.3367389103,"https://salsa.debian.org/python-team/packages/django-cors-headers","https://github.com/adamchainz/django-cors-headers",3979.5858333333,47,28,0,63,10,0,0,66,3,"3",1.37333333333333,1.15151515151515 -"django-guardian",-0.6318405623,-0.1756665381,-0.763973424,"https://salsa.debian.org/python-team/packages/django-guardian","https://github.com/lukaszb/django-guardian",4311.9324074074,74,100,0,127,8,0,0,133,3,"3",1.57471264367816,1.06015037593985 -"pkg-django-restricted-resource",-1.2869731875,0.2279132109,-1.7519542903,"https://github.com/Linaro/pkg-django-restricted-resource","https://github.com/Linaro/pkg-django-restricted-resource",3194.8619212963,0,7,0,4,3,0,0,5,2,"2",2,1.6 -"django-reversion",-0.777150964,0.9983388355,-1.4152875579,"https://salsa.debian.org/python-team/packages/django-reversion","https://github.com/etianen/django-reversion.git",5522.8556828704,31,173,0,144,17,0,14,167,4,"4",1.84803921568627,1.10179640718563 -"django-setuptest",-1.0039883027,1.8917399808,-1.7398796439,"https://salsa.debian.org/python-team/packages/django-setuptest","https://github.com/praekelt/django-setuptest.git",1589.0550810185,0,22,0,14,37,0,0,38,1,"1",2,1.97368421052632 -"pkg-django-testproject",-0.7999395109,1.6435435249,-1.4494523946,"https://github.com/Linaro/pkg-django-testproject","https://github.com/Linaro/pkg-django-testproject",3196.2780324074,0,5,0,3,4,0,0,4,2,"2",2,2 -"pkg-django-testscenarios",-1.3257146932,-0.0322578006,-1.6658090716,"https://github.com/Linaro/pkg-django-testscenarios","https://github.com/Linaro/pkg-django-testscenarios",3196.2901157408,0,7,0,4,5,0,0,5,2,"2",2,2 -"django-xmlrpc",-1.0500707985,0.6741579236,-1.5157519079,"https://salsa.debian.org/python-team/packages/django-xmlrpc","https://github.com/Fantomas42/django-xmlrpc",2632.3087384259,1,5,0,2,8,0,0,8,1,"1",1.83333333333333,2 -"dmarc-cat",-0.1483894393,3.3771756375,-1.1901233623,"https://salsa.debian.org/go-team/packages/dmarc-cat","https://github.com/keltia/dmarc-cat.git",1521.7803009259,0,4,0,3,19,0,0,19,1,"1",2,2 -"dms",-1.7923560941,0.9490139495,-3.0040589667,"https://github.com/grantma/dms","https://github.com/grantma/dms",1425.0333101852,0,7,0,1,0,0,0,1,1,"1",2,1 -"dnstap-ldns",-1.9630028548,0.4908382481,-2.5788124384,"https://salsa.debian.org/dns-team/dnstap-ldns","https://github.com/dnstap/dnstap-ldns.git",2977.0303009259,3,7,0,5,6,0,0,7,2,"2",1.7,1.85714285714286 -"dnswalk",1.9006613427,5.3064955884,0.5879892736,"https://salsa.debian.org/debian/dnswalk","https://github.com/davebarr/dnswalk.git",3790.9134837963,0,2,0,2,5,0,0,5,3,"3",2,2 -"docdiff",-0.3637756064,0.6895030349,-0.723612814,"https://salsa.debian.org/debian/docdiff","https://github.com/hisashim/docdiff",3912.6548148148,0,6,1,5,11,0,2,13,3,"3",2,1.84615384615385 -"Droopy",-0.8939869433,1.3787169177,-1.3337026104,"https://salsa.debian.org/debian/droopy","https://github.com/stackp/Droopy.git",5280.2147685185,0,7,0,4,33,0,0,33,4,"4",2,2 -"drumkv1",-0.1956463038,1.0706720909,-0.4594280916,"https://salsa.debian.org/multimedia-team/drumkv1","https://github.com/rncbc/drumkv1.git",4115.9090277778,1,13,0,4,23,0,1,24,3,"3",1.92857142857143,1.95833333333333 -"dtach",0.4720927384,2.0532258223,-0.05646356,"https://salsa.debian.org/voelkel-guest/dtach","https://github.com/crigler/dtach.git",1708.1544328704,2,2,0,3,25,0,0,26,1,"1",1.5,1.96153846153846 -"dtfabric",0.0544342308,2.3417288031,-0.4793676181,"https://salsa.debian.org/debian/dtfabric","https://github.com/libyal/dtfabric.git",2597.9576388889,0,1,0,1,6,0,1,7,1,"1",2,1.85714285714286 -"dumpet",0.8119567162,4.8329646447,-0.595687567,"https://salsa.debian.org/debian/dumpet","https://github.com/rhboot/dumpet.git",4953.9319097222,2,5,0,3,2,0,0,4,3,"3",1.71428571428571,1.5 -"dvbcut-deb",-0.140015948,0.3995494726,-0.3603098157,"https://github.com/bernhardu/dvbcut-deb","https://github.com/bernhardu/dvbcut-deb",2301.5843402778,21,3,0,13,12,0,0,21,1,"1",1.125,1.57142857142857 -"dvisvgm",0.1719982822,1.5508413641,-0.14266231,"https://github.com/debian-tex/dvisvgm","https://github.com/debian-tex/dvisvgm",1541.3238194445,1,6,0,3,2,0,0,3,1,"1",1.85714285714286,1.66666666666667 -"dymo-cups-drivers",0.1695490981,1.2653423504,-0.0340436611,"https://salsa.debian.org/printing-team/dymo-cups-drivers","https://github.com/matthiasbock/dymo-cups-drivers",4079.6409837963,4,11,0,5,30,0,0,31,3,"3",1.73333333333333,1.96774193548387 -"e2tools",-0.3154826477,0.572945917,-0.5928968266,"https://salsa.debian.org/debian/e2tools","https://github.com/e2tools/e2tools",1196.5083217593,2,6,3,6,14,0,0,16,1,"1",1.75,1.875 -"easygit",0.383586011,3.5957594474,-0.5807571227,"https://salsa.debian.org/debian/easygit","https://github.com/newren/easygit",3676.0657175926,399,15,0,318,0,0,0,318,2,"2",1.03623188405797,1 -"easyprocess",-0.5379917332,1.9459970198,-1.0219432067,"https://salsa.debian.org/python-team/packages/easyprocess","https://github.com/ponty/easyprocess.git",4652.3978009259,3,9,0,6,23,0,0,23,3,"3",1.75,2 -"ecdsautils",-0.5842189084,1.6112758398,-1.017052069,"https://salsa.debian.org/communitywlan-team/ecdsautils","https://github.com/freifunk-gluon/ecdsautils",3436.625625,1,8,0,5,0,0,0,5,2,"2",1.88888888888889,1 -"edbrowse",0.3708322115,1.5829127394,-0.1941202595,"https://salsa.debian.org/a11y-team/edbrowse","https://github.com/CMB/edbrowse.git",5783.5197453704,9,22,0,20,30,0,10,47,4,"4",1.70967741935484,1.63829787234043 -"emacs-python-environment",-0.6497796464,0.8881585898,-0.9254847969,"https://salsa.debian.org/emacsen-team/emacs-python-environment","https://github.com/tkf/emacs-python-environment.git",626.8352777778,0,3,0,3,12,0,0,12,1,"1",2,2 -"engauge_debian",0.4683184378,1.884463339,-0.1321998122,"https://github.com/winchen/engauge_debian","https://github.com/winchen/engauge_debian",3059.1429976852,0,6,0,2,1,0,0,2,2,"2",2,1.5 -"enjarify",0.4273596447,3.1508079803,-0.3690926561,"https://salsa.debian.org/android-tools-team/enjarify","https://github.com/Storyyeller/enjarify",1738.1109490741,3,12,0,10,26,0,0,30,1,"1",1.8,1.86666666666667 -"entrypoints",0.857419697,4.1047834353,0.0074721981,"https://salsa.debian.org/python-team/packages/entrypoints","https://github.com/takluyver/entrypoints",2468.1372569445,5,10,0,10,52,0,0,52,1,"1",1.66666666666667,2 -"enzyme",0.2209281122,2.7508227467,-0.5362781772,"https://salsa.debian.org/python-team/packages/enzyme","https://github.com/Diaoul/enzyme",665.1386111111,0,3,0,2,20,0,0,20,1,"1",2,2 -"epoptes",-0.5424519728,0.3737235027,-0.8396779959,"https://github.com/epoptes/epoptes","https://github.com/epoptes/epoptes",4351.4067939815,4,10,0,8,6,0,0,11,3,"3",1.71428571428571,1.54545454545455 -"epr-api",-0.1835594424,2.5490628716,-0.8931266505,"https://salsa.debian.org/debian-gis-team/epr-api","https://github.com/bcdev/epr-api",4843.1898611111,0,19,0,7,3,0,0,8,3,"3",2,1.375 -"erfa",0.2626332321,2.3178268988,-0.1835083824,"https://salsa.debian.org/debian-astro-team/erfa","https://github.com/liberfa/erfa",3687.0853240741,3,14,0,13,25,0,0,29,2,"2",1.82352941176471,1.86206896551724 -"eris",-0.632476633,0.6133940856,-1.1993507243,"https://salsa.debian.org/games-team/eris","https://github.com/worldforge/eris",5633.2405092593,2,7,0,8,6,0,0,10,4,"4",1.77777777777778,1.6 -"bear",-1.5598707008,0.7740571851,-2.0549566735,"https://salsa.debian.org/erlang-team/packages/erlang-bear","https://github.com/boundary/bear.git",985.0124652778,0,11,0,6,17,0,0,17,1,"1",2,2 -"cuttlefish",-1.1570169301,1.4079371161,-1.9722441303,"https://salsa.debian.org/erlang-team/packages/erlang-cuttlefish","https://github.com/Kyorai/cuttlefish.git",3504.2075115741,6,42,0,29,12,0,17,51,2,"2",1.875,1.23529411764706 -"getopt",-1.2464014688,1.2405525277,-1.7527351047,"https://salsa.debian.org/erlang-team/packages/erlang-getopt","https://github.com/jcomellas/getopt",5121.0564583333,4,19,0,16,31,0,0,33,4,"4",1.82608695652174,1.93939393939394 -"extrace",-0.716911996,1.6418001527,-1.2621214591,"https://salsa.debian.org/debian/extrace","https://github.com/chneukirchen/extrace",3149.892662037,4,2,0,5,5,0,0,6,2,"2",1.33333333333333,1.83333333333333 -"eyeD3-debian",1.2363220835,2.3225067373,0.5919861745,"https://github.com/gaetano-guerriero/eyeD3-debian","https://github.com/gaetano-guerriero/eyeD3-debian",2546.8571180556,1,6,0,1,2,0,0,3,1,"1",1.85714285714286,1.66666666666667 -"faac",0.4086376314,1.7882056088,-0.0272312251,"https://salsa.debian.org/multimedia-team/faac","https://github.com/knik0/faac",5409.5071180556,6,12,0,10,30,0,0,30,4,"4",1.66666666666667,2 -"faad2",1.0544175056,2.2339624185,0.4716640534,"https://salsa.debian.org/multimedia-team/faad2","https://github.com/knik0/faad2.git",5741.3708333333,16,14,0,22,44,0,0,49,4,"4",1.46666666666667,1.89795918367347 -"faba-icon-theme",0.8911212387,4.4384740676,-0.1142443813,"https://github.com/ubuntubudgie/faba-icon-theme/tree/debian","https://github.com/ubuntubudgie/faba-icon-theme",1592.9366782407,0,6,0,2,0,0,0,2,1,"1",2,1 -"fabulous",-1.9004216273,-0.0667224502,-2.4935029916,"https://salsa.debian.org/python-team/packages/fabulous","https://github.com/jart/fabulous.git",4223.1852546296,4,8,0,7,25,5,0,30,3,"3",1.66666666666667,1.83333333333333 -"fadecut",-0.6673500925,1.8538364578,-1.1385440983,"https://github.com/fadecut/fadecut/tree/debian","https://github.com/fadecut/fadecut",2792.815474537,1,14,5,2,11,0,1,12,2,"2",1.93333333333333,1.91666666666667 -"fai",-0.1410290031,-0.0834131887,-0.1875070234,"https://github.com/faiproject/fai","https://github.com/faiproject/fai",5773.004537037,75,16,0,54,6,0,0,57,4,"4",1.17582417582418,1.10526315789474 -"fakesleep",-2.4812653648,0.0741874264,-3.0028931926,"https://salsa.debian.org/python-team/packages/fakesleep","https://github.com/wearpants/fakesleep",0.0144907407,0,1,0,1,3,0,0,3,1,"1",2,2 -"fastd",0.3335142219,3.127871508,-0.5170005596,"https://salsa.debian.org/communitywlan-team/fastd","https://github.com/NeoRaider/fastd.git",4199.101087963,7,5,0,10,31,0,1,35,3,"3",1.41666666666667,1.88571428571429 -"ft2-clone",-1.4004624291,1.3055702677,-2.1338147005,"https://salsa.debian.org/multimedia-team/fasttracker2","https://github.com/8bitbubsy/ft2-clone",1461.1673958333,1,7,0,7,46,0,0,46,1,"1",1.875,2 -"fastx_toolkit",-0.3457886057,1.0929975464,-0.7809122121,"https://salsa.debian.org/med-team/fastx-toolkit","https://github.com/agordon/fastx_toolkit.git",3133.6998726852,1,6,0,3,38,0,0,39,2,"2",1.85714285714286,1.97435897435897 -"fatcat",0.4842442346,3.2701121154,-0.2692644397,"https://salsa.debian.org/pkg-security-team/fatcat","https://github.com/gregwar/fatcat",3248.5118981482,2,7,0,6,33,0,0,33,2,"2",1.77777777777778,2 -"fatresize",1.7814820731,4.9928976784,0.5330410517,"https://salsa.debian.org/parted-team/fatresize","https://github.com/ya-mouse/fatresize",2189.5325,0,6,0,4,33,0,0,33,1,"1",2,2 -"fbpager",1.5882380186,4.0001262231,0.5019616446,"https://salsa.debian.org/debian/fbpager","https://github.com/fluxbox/fbpager",37.6531828704,0,2,0,1,2,0,0,3,1,"1",2,1.66666666666667 -"fbset",1.3134317762,2.3999244161,0.6559617709,"https://github.com/sudipm-mukherjee/fbset.git","https://github.com/sudipm-mukherjee/fbset.git",5178.7434375,2,3,0,1,1,0,0,2,4,"4",1.6,1.5 -"fcgiwrap",0.3134577921,1.1712166293,-0.0802338795,"https://salsa.debian.org/debian/fcgiwrap","https://github.com/gnosek/fcgiwrap",2589.7245138889,5,10,0,10,65,0,0,68,1,"1",1.66666666666667,1.95588235294118 -"fcitx-libpinyin",1.3904314469,5.5830539288,-0.0318276844,"https://salsa.debian.org/input-method-team/fcitx-libpinyin","https://github.com/fcitx/fcitx-libpinyin",4359.6518287037,2,6,0,6,22,0,0,22,3,"3",1.75,2 -"pkg-fdm",0.3672168929,2.1938634044,-0.4626394068,"https://github.com/ft/pkg-fdm/","https://github.com/ft/pkg-fdm",5107.6653125,0,3,0,2,1,0,0,3,4,"4",2,1.33333333333333 -"fizmo-ncursesw",-0.2032604477,2.2028162183,-0.7770451436,"https://github.com/chrender/fizmo-ncursesw","https://github.com/chrender/fizmo-ncursesw",4851.4142708333,0,5,0,2,1,0,0,2,3,"3",2,1.5 -"flake8-polyfill",-0.2905096989,2.1500667272,-0.8317869422,"https://salsa.debian.org/python-team/packages/flake8-polyfill","https://github.com/PyCQA/flake8-polyfill.git",2673.1830902778,0,6,0,4,5,0,0,7,1,"1",2,1.71428571428571 -"flam3",0.7831072925,3.742743382,-0.2650609153,"https://salsa.debian.org/debian/flam3","https://github.com/scottdraves/flam3",1152.1052083333,1,7,0,3,25,0,4,29,1,"1",1.875,1.86206896551724 -"flask-jwt-simple",-3.7410042156,-1.191605345,-4.3201217059,"https://salsa.debian.org/python-team/packages/flask-jwt-simple","https://github.com/vimalloc/flask-jwt-simple.git",1518.8651041667,3,4,0,3,21,0,0,22,1,"1",1.57142857142857,1.95454545454545 -"flask-ldapconn",-1.0816817059,1.8547595955,-1.9421748383,"https://salsa.debian.org/python-team/packages/flask-ldapconn","https://github.com/rroemhild/flask-ldapconn",3190.6329976852,4,10,0,11,32,0,0,32,2,"2",1.71428571428571,2 -"flask-silk",-0.0747361696,1.0191065444,-0.3413292213,"https://salsa.debian.org/python-team/packages/flask-silk","https://github.com/sublee/flask-silk.git",2842.4741087963,0,7,0,3,4,0,0,4,2,"2",2,2 -"Junicode-font",0.9749123035,2.3528322079,0.3195301325,"https://salsa.debian.org/fonts-team/fonts-junicode","https://github.com/psb1558/Junicode-font",1677.9374305556,3,4,0,6,15,0,0,19,1,"1",1.57142857142857,1.78947368421053 -"font-abyssinica",1.1912418458,4.4703518731,0.0766166908,"https://salsa.debian.org/fonts-team/fonts-sil-abyssinica","https://github.com/silnrsi/font-abyssinica",1729.8640509259,1,8,0,7,2,0,0,7,1,"1",1.88888888888889,1.28571428571429 -"font-andika",0.226819753,1.7302356665,-0.1521199628,"https://salsa.debian.org/fonts-team/fonts-sil-andika","https://github.com/silnrsi/font-andika",2361.7046180556,0,9,0,6,6,0,0,11,1,"1",2,1.54545454545455 -"foomatic-db",1.5209798812,2.5785791995,0.8766539303,"https://salsa.debian.org/printing-team/foomatic-db","https://github.com/OpenPrinting/foomatic-db.git",5681.1902083333,5,53,0,16,22,0,0,30,4,"4",1.91379310344828,1.73333333333333 -"formiko-debian",0.1628471672,3.1297243219,-0.6061311313,"https://github.com/ondratu/formiko-debian","https://github.com/ondratu/formiko-debian",1770.974849537,2,2,0,3,3,0,0,3,1,"1",1.5,2 -"fortunes-br",0.3826030919,2.4726357351,-0.4239383871,"https://github.com/leitao/fortunes-br.git","https://github.com/leitao/fortunes-br.git",0.0056944444,0,1,0,1,0,0,0,1,1,"1",2,1 -"fortunes-mario-deb",0.2746196581,1.8773332397,-0.3193714441,"http://github.com/fike/fortunes-mario-deb","http://github.com/fike/fortunes-mario-deb",1606.775150463,3,8,0,0,0,0,0,0,1,"1",1.72727272727273,NA -"fpgatools",0.2633177336,3.6230241615,-0.6179143711,"https://github.com/Wolfgang-Spraul/fpgatools","https://github.com/Wolfgang-Spraul/fpgatools",1132.0893287037,1,6,0,5,0,0,0,5,1,"1",1.85714285714286,1 -"fqterm",-1.4778336115,-0.4100027914,-1.8864383483,"https://salsa.debian.org/chinese-team/fqterm","https://github.com/mytbk/fqterm",3515.765625,5,7,0,7,21,0,1,23,2,"2",1.58333333333333,1.91304347826087 -"FreeAlchemist",0.059449695,2.2746437451,-0.4707582387,"https://salsa.debian.org/python-team/packages/freealchemist","https://github.com/dakk/FreeAlchemist",3586.1830324074,0,3,0,1,0,0,0,1,2,"2",2,1 -"freedv-gui",-0.3213805891,1.1426935949,-0.7378333115,"https://salsa.debian.org/debian-hamradio-team/freedv","https://github.com/drowe67/freedv-gui",3043.6515972222,1,33,0,13,0,0,0,13,2,"2",1.97058823529412,1 -"freewheeling",0.5792903992,2.5071657819,-0.2534567966,"https://salsa.debian.org/multimedia-team/freewheeling","https://github.com/free-wheeling/freewheeling",5218.8730671296,1,3,0,3,28,0,2,30,4,"4",1.75,1.93333333333333 -"frozen-bubble",0.1650357772,0.4601977225,-0.0231433032,"https://salsa.debian.org/perl-team/modules/packages/frozen-bubble","https://github.com/kthakore/frozen-bubble.git",3389.417650463,4,17,0,10,23,0,0,27,2,"2",1.80952380952381,1.85185185185185 -"fyba",0.4754986254,2.6289545812,-0.0402028003,"https://salsa.debian.org/debian-gis-team/fyba","https://github.com/kartverket/fyba.git",1185.3266203704,1,10,0,5,17,0,0,17,1,"1",1.90909090909091,2 -"g2",-0.2327989276,0.4800818237,-0.5737455032,"https://salsa.debian.org/med-team/g2","https://github.com/danielrmeyer/g2",0,0,1,0,0,3,0,0,3,NA,NA,2,2 -"ganeti-os-noop",-0.2281036129,2.1546963922,-0.852366861,"https://salsa.debian.org/ganeti-team/ganeti-os-noop","https://github.com/grnet/ganeti-os-noop",677.1858449074,0,6,0,2,5,1,0,6,1,"1",2,1.83333333333333 -"ganglia-modules-linux",0.0664199188,1.2956066726,-0.272928033,"https://salsa.debian.org/debian/ganglia-modules-linux","https://github.com/ganglia/ganglia-modules-linux.git",1617.3040972222,0,6,0,3,4,0,0,4,1,"1",2,2 -"sonata",-0.5294268825,1.0612461481,-0.8314567315,"https://salsa.debian.org/science-team/gap-sonata","https://github.com/gap-packages/sonata.git",4006.9744907407,4,7,0,4,8,0,0,60,3,"3",1.63636363636364,1.13333333333333 -"toric",-0.2451456454,2.4949167647,-0.8186260968,"https://salsa.debian.org/science-team/gap-toric","https://github.com/gap-packages/toric.git",3029.62,4,5,0,5,6,0,0,7,2,"2",1.55555555555556,1.85714285714286 -"garmintools",-0.2174342508,0.5366088912,-0.517674515,"https://salsa.debian.org/debian/garmin-forerunner-tools","https://github.com/jorgesca/garmintools.git",2685.7982986111,0,5,0,3,1,0,0,4,1,"1",2,1.25 -"gatk-native-bindings",-0.1009865887,2.4624009827,-0.676296384,"https://salsa.debian.org/java-team/gatk-native-bindings","https://github.com/broadinstitute/gatk-native-bindings",505.8018981481,1,4,0,3,6,0,0,6,1,"1",1.8,2 -"gau2grid",-0.815898809,1.1342927173,-1.4069047503,"https://salsa.debian.org/debichem-team/gau2grid","https://github.com/dgasmith/gau2grid",1166.9793981482,4,10,0,8,18,0,0,18,1,"1",1.71428571428571,2 -"gconjugue",-1.193395361,0.6134141951,-1.7117987645,"https://salsa.debian.org/debian/gconjugue","https://github.com/jalvesaq/gconjugue",2752.1538888889,0,4,0,1,3,0,0,3,2,"2",2,2 -"gdnsd",-2.9678392165,-0.3979054994,-3.671905411,"https://github.com/paravoid/gdnsd","https://github.com/paravoid/gdnsd",4241.3566550926,2,11,0,9,3,0,0,11,3,"3",1.84615384615385,1.27272727272727 -"geki2",-0.2585741806,1.1302096458,-0.6025965378,"https://salsa.debian.org/games-team/geki2","https://github.com/Quipyowert2/geki2",1827.8569328704,0,3,0,1,1,0,0,1,1,"1",2,2 -"gelemental",0.1018714919,1.200080654,-0.3080550909,"https://salsa.debian.org/debichem-team/gelemental","https://github.com/ginggs/gelemental",1560.5809722222,8,4,0,9,9,0,0,12,1,"1",1.33333333333333,1.75 -"genetic",0.2707726153,2.7069673968,-0.4380759284,"https://salsa.debian.org/science-team/genetic","https://github.com/skoblov-lab/genetic",1118.9616550926,2,4,0,1,1,0,0,1,1,"1",1.66666666666667,2 -"genext2fs",-0.2882576546,0.2063423739,-0.5033680475,"https://salsa.debian.org/debian/genext2fs","https://github.com/bestouff/genext2fs",3682.2901041667,0,10,0,5,18,0,0,19,2,"2",2,1.94736842105263 -"gimp-texturize",0.1555855572,1.2662980132,-0.1945666027,"https://salsa.debian.org/debian/gimp-texturize","https://github.com/lmanul/gimp-texturize.git",3625.7350810185,1,11,0,4,8,0,0,8,2,"2",1.91666666666667,2 -"ginkgocadx",-0.2628483641,0.2619463655,-0.4738586037,"https://salsa.debian.org/med-team/ginkgocadx","https://github.com/gerddie/ginkgocadx.git",2123.8061111111,1,5,0,5,27,0,0,27,1,"1",1.83333333333333,2 -"git-lfs",0.1085080655,1.2887939983,-0.2117786782,"https://salsa.debian.org/go-team/packages/git-lfs","https://github.com/github/git-lfs.git",3479.3090162037,54,197,0,202,5,0,124,330,2,"2",1.78486055776892,1.01515151515152 -"git-remote-hg",1.3804187017,3.9090882195,0.2873521231,"https://salsa.debian.org/debian/git-remote-hg","https://github.com/mnauw/git-remote-hg/commits/master",5185.326875,55,11,0,0,0,0,0,0,4,"4",1.16666666666667,NA -"debian",-0.5135509471,0.0361166657,-0.7320665039,"https://salsa.debian.org/debian/github-backup","https://salsa.debian.org/debian/github-backup",3299.6675694445,9,13,0,0,0,0,0,2,2,"2",1.59090909090909,1 -"gitless",-1.0129472172,1.1745444276,-1.5532855313,"https://salsa.debian.org/python-team/packages/gitless","https://github.com/sdg-mit/gitless.git",1580.4098032407,8,31,0,24,19,0,0,38,1,"1",1.7948717948718,1.5 -"gitmagic",0.0058626792,1.3968023647,-0.4117773836,"https://salsa.debian.org/debian/gitmagic","https://github.com/blynn/gitmagic",4774.4399537037,12,73,0,47,40,0,3,65,3,"3",1.85882352941176,1.61538461538462 -"giza",-0.0821548044,1.7697955982,-0.4330998724,"https://salsa.debian.org/debian-astro-team/giza","https://github.com/danieljprice/giza",4755.9934837963,2,14,0,9,20,0,1,23,3,"3",1.875,1.8695652173913 -"gjots2",0.4947222776,2.209205505,-0.3492735275,"https://github.com/leggewie-DM/gjots2","https://github.com/leggewie-DM/gjots2",4231.0400231482,3,4,0,1,2,0,0,2,3,"3",1.57142857142857,2 -"gkrellm-cpufreq-debian",0.5206628103,3.0983277333,-0.2908114881,"https://github.com/glaubitz/gkrellm-cpufreq-debian","https://github.com/glaubitz/gkrellm-cpufreq-debian",3039.7838657408,1,2,0,1,3,0,0,3,2,"2",1.66666666666667,2 -"gkrelluim",-1.2524698575,0.70104569,-1.6202431051,"https://salsa.debian.org/debian/gkrelluim","https://github.com/dai-vdr/gkrelluim.git",5001.2533333333,0,1,0,0,0,0,0,0,4,"4",2,NA -"glimpse",4.8421978907,8.0624327916,3.3845931676,"https://github.com/az143/glimpse","https://github.com/az143/glimpse",3292.5989583333,0,6,0,2,2,0,0,4,2,"2",2,1.5 -"global",0.9251069439,1.8029807522,0.3956705838,"https://github.com/punitagrawal/global","https://github.com/punitagrawal/global",2253.924212963,4,4,0,5,4,0,0,6,1,"1",1.5,1.66666666666667 -"gmetric4j",-2.7598692877,-0.5906102463,-3.2950920542,"https://github.com/ganglia/gmetric4j","https://github.com/ganglia/gmetric4j",3040.7001273148,1,11,0,5,21,0,2,23,2,"2",1.91666666666667,1.91304347826087 -"gnarwl",-1.0091273178,-0.1197325367,-1.4783256893,"https://salsa.debian.org/debian/gnarwl","https://github.com/fln/gnarwl",2570.5118287037,1,9,0,5,7,0,0,8,1,"1",1.9,1.875 -"dash-to-panel",0.1124971506,2.1907441864,-0.4246734255,"https://salsa.debian.org/gnome-team/shell-extensions/gnome-shell-extension-dash-to-panel","https://github.com/home-sweet-gnome/dash-to-panel.git",2629.7539467593,40,85,0,86,104,0,2,187,1,"1",1.68,1.55614973262032 -"dash-to-dock",-0.0287596469,0.9830411728,-0.301129726,"https://salsa.debian.org/gnome-team/shell-extensions/gnome-shell-extension-dashtodock","https://github.com/micheleg/dash-to-dock.git",4172.0530092593,157,30,0,142,64,0,0,197,3,"3",1.16042780748663,1.3248730964467 -"GoldenEye",0.2914223421,3.2376647843,-0.4228022843,"https://salsa.debian.org/pkg-security-team/goldeneye","https://github.com/jseidl/GoldenEye",3012.1110532407,1,7,0,5,0,0,0,5,2,"2",1.875,1 -"apps-gorm",0.3792145956,1.5053938025,-0.0975198397,"https://salsa.debian.org/gnustep-team/gorm.app","https://github.com/gnustep/apps-gorm",5785.6866782407,3,22,0,21,13,0,0,27,4,"4",1.88,1.48148148148148 -"gosa-core",-0.3775685336,-0.2189132452,-0.4901429898,"https://salsa.debian.org/debian-edu-pkg-team/gosa","https://github.com/gosa-project/gosa-core",5676.7658217593,7,31,0,8,18,0,0,20,4,"4",1.81578947368421,1.9 -"gosa-plugins-mailaddress",-2.3383979882,0.2643568587,-2.9856475557,"https://salsa.debian.org/debian-edu-pkg-team/gosa-plugin-mailaddress","https://github.com/gosa-project/gosa-plugins-mailaddress",2274.6763657408,0,4,0,2,4,0,0,4,1,"1",2,2 -"gosa-plugins-netgroups",-0.9914007629,0.4777372444,-1.3827009663,"https://salsa.debian.org/debian-edu-pkg-team/gosa-plugin-netgroups","https://github.com/gosa-project/gosa-plugins-netgroups",1422.7270023148,0,3,0,1,2,0,0,2,1,"1",2,2 -"gosa-plugins-pwreset",-1.3598337718,0.2879233373,-1.6292931799,"https://salsa.debian.org/debian-edu-pkg-team/gosa-plugin-pwreset","https://github.com/gosa-project/gosa-plugins-pwreset",2184.168125,0,3,0,1,1,0,0,2,1,"1",2,1.5 -"linux-crypto",-2.3611563875,-0.8645584676,-2.6234146821,"https://salsa.debian.org/lumag/gost-crypto","https://github.com/GostCrypt/linux-crypto.git",1726.5372222222,2,3,0,2,3,0,0,3,1,"1",1.6,2 -"gpicview",2.0702671645,4.218597649,1.053942169,"https://salsa.debian.org/lxde-team/gpicview","https://github.com/lxde/gpicview",5713.732662037,76,42,0,59,6,0,0,60,4,"4",1.35593220338983,1.1 -"gpp",0.6295645906,3.8657120667,-0.3089812218,"https://salsa.debian.org/debian/gpp","https://github.com/logological/gpp/commits/master",5185.326875,55,11,0,0,0,0,0,0,4,"4",1.16666666666667,NA -"gpustat",-0.7414031604,1.6738603051,-1.1885003927,"https://salsa.debian.org/nvidia-team/gpustat","https://github.com/wookayin/gpustat",2769.8730787037,16,5,3,17,31,0,0,44,2,"2",1.23809523809524,1.70454545454545 -"gpyfft",-0.0412032188,3.0931064376,-0.9221041966,"https://salsa.debian.org/science-team/gpyfft","https://github.com/geggo/gpyfft",2840.7253009259,4,10,0,8,33,0,0,33,2,"2",1.71428571428571,2 -"gss-ntlmssp",-1.0758514008,0.7187446283,-1.5147853098,"https://salsa.debian.org/freeipa-team/gss-ntlmssp","https://github.com/gssapi/gss-ntlmssp",3594.9212152778,10,4,0,7,12,0,1,19,2,"2",1.28571428571429,1.63157894736842 -"gtkguitune",-0.2491277386,0.3826186785,-0.4591495452,"https://github.com/bobek/gtkguitune","https://github.com/bobek/gtkguitune",3186.2603587963,1,3,0,2,1,0,0,2,2,"2",1.75,1.5 -"gtkterm",1.6614158143,3.2236786848,0.801083568,"https://salsa.debian.org/debian/gtkterm","https://github.com/Jeija/gtkterm.git",4575.4452083333,6,17,0,14,44,0,0,46,3,"3",1.73913043478261,1.95652173913043 -"gtranscribe",-0.5259853209,1.6855244705,-0.950618829,"https://salsa.debian.org/debian/gtranscribe","https://github.com/innir/gtranscribe",3558.9036921296,0,5,1,2,14,0,0,14,2,"2",2,2 -"guake-indicator",0.2250848406,2.5013911283,-0.5378976224,"https://salsa.debian.org/debian/guake-indicator/","https://github.com/Ozzyboshi/guake-indicator",2489.1411226852,1,8,0,4,11,0,0,11,1,"1",1.88888888888889,2 -"gufw",1.8217065732,4.3624901931,0.7344598754,"https://salsa.debian.org/python-team/packages/gui-ufw","https://github.com/costales/gufw.git",1462.9175578704,0,7,0,8,66,0,0,67,1,"1",2,1.98507462686567 -"guidedog",-1.2127820662,0.0904612737,-1.6926274962,"https://github.com/antocm/guidedog/tree/debian","https://github.com/antocm/guidedog",2480.6617361111,0,5,0,2,1,0,1,4,1,"1",2,1.25 -"guile-ssh",-0.8980031766,3.1579670718,-2.0800708726,"https://salsa.debian.org/debian/guile-ssh","https://github.com/artyom-poptsov/guile-ssh.git",3867.3559837963,0,10,0,8,28,0,0,28,3,"3",2,2 -"gup",-5.1695702647,-4.4485454537,-5.4289590562,"https://github.com/rfc1036/gup","https://github.com/rfc1036/gup",3593.8147453704,0,1,0,1,0,0,0,1,2,"2",2,1 -"guzzle_sphinx_theme",-0.8704022633,0.681504729,-1.1374775257,"https://salsa.debian.org/python-team/packages/guzzle-sphinx-theme","https://github.com/guzzle/guzzle_sphinx_theme.git",2860.3134027778,3,11,0,12,42,0,0,42,2,"2",1.78571428571429,2 -"debian-gwaei",-0.2415301818,1.2081497422,-0.8722234296,"https://github.com/norbusan/debian-gwaei","https://github.com/norbusan/debian-gwaei",2765.6634375,2,2,0,2,3,0,0,3,2,"2",1.5,2 -"gwakeonlan",0.8535169941,3.0627414632,-0.0322068923,"https://salsa.debian.org/debian/gwakeonlan","https://github.com/muflone/gwakeonlan.git",4933.5151273148,2,13,0,10,35,0,0,35,3,"3",1.86666666666667,2 -"gwc",0.608752043,1.6289733041,0.0519069422,"https://salsa.debian.org/multimedia-team/gwc","https://github.com/AlisterH/gwc.git",3165.1705324074,1,5,0,3,6,0,0,7,2,"2",1.83333333333333,1.85714285714286 -"gxkb",0.3787936181,4.0698464881,-0.6334875708,"https://github.com/mati75/gxkb.git","https://github.com/mati75/gxkb.git",2732.567650463,0,4,0,2,2,0,0,3,1,"1",2,1.66666666666667 -"gxtuner",1.2625236588,4.7533829415,0.0339744566,"https://salsa.debian.org/multimedia-team/gxtuner","https://github.com/brummer10/gxtuner",1914.1892013889,3,6,0,4,9,0,0,9,1,"1",1.66666666666667,2 -"h2o",-0.7321540349,0.815719718,-1.2812732312,"https://salsa.debian.org/debian/h2o","https://github.com/h2o/h2o",4716.5859490741,44,155,4,123,17,0,22,154,3,"3",1.77889447236181,1.11038961038961 -"h5utils",-0.0466394355,0.6200500479,-0.3159473526,"https://salsa.debian.org/debian-gis-team/h5utils","https://github.com/NanoComp/h5utils.git",5379.8304166667,0,6,0,3,18,0,0,18,4,"4",2,2 -"hacktv",-2.0082673058,0.152267044,-2.4727541201,"https://salsa.debian.org/debian-hamradio-team/hacktv","https://github.com/fsphil/hacktv",2394.7430787037,3,7,0,8,43,0,0,45,1,"1",1.7,1.95555555555556 -"HandBrake",1.3904843391,2.685148707,0.6451582617,"https://salsa.debian.org/multimedia-team/handbrake","https://github.com/HandBrake/HandBrake",5786.3675231482,105,51,3,108,0,0,2,110,4,"4",1.32692307692308,1 -"hexedit",1.4888142147,3.4858685969,0.5617313768,"https://salsa.debian.org/debian/hexedit","https://github.com/pixel/hexedit.git",5414.7907060185,8,14,0,14,45,0,0,45,4,"4",1.63636363636364,2 -"hexter",0.4080603481,2.7603000142,-0.3443231764,"https://salsa.debian.org/multimedia-team/hexter","https://github.com/smbolton/hexter.git",4380.3528472222,0,6,0,5,17,0,0,17,3,"3",2,2 -"hfst-ospell",0.2591920737,1.3643095914,-0.0408851515,"https://salsa.debian.org/science-team/hfst-ospell","https://github.com/hfst/hfst-ospell.git",4745.7576967593,1,17,0,8,24,0,1,26,3,"3",1.94444444444444,1.92307692307692 -"hijra",-1.1521044725,0.9019784859,-1.9896405953,"https://salsa.debian.org/islamic-team/hijra","https://github.com/ojuba-org/hijra.git",4311.2884143519,0,8,0,4,4,0,0,6,3,"3",2,1.66666666666667 -"hinawa-utils",-1.8036430906,0.9409258571,-2.4422801802,"https://salsa.debian.org/debian/hinawa-utils/","https://github.com/takaswie/hinawa-utils.git",2264.2987962963,1,2,0,2,8,0,0,8,1,"1",1.66666666666667,2 -"hiro",-3.1230113579,-1.1402355338,-3.6931446576,"https://salsa.debian.org/python-team/packages/hiro","https://github.com/alisaifee/hiro",3329.7532638889,1,3,0,3,6,0,0,6,2,"2",1.75,2 -"hmat-oss",0.3027957485,3.0822404955,-0.6301530543,"https://salsa.debian.org/science-team/hmat-oss","https://github.com/jeromerobert/hmat-oss.git",3261.6730555556,6,19,0,14,7,0,0,16,2,"2",1.76,1.4375 -"hodie",-0.8398270988,0.8472590081,-1.2059612682,"https://salsa.debian.org/cts/hodie","https://github.com/michiexile/hodie",1318.6005671296,0,5,0,1,2,0,0,2,1,"1",2,2 -"hoel",-2.626226217,-0.6734593354,-3.0112543725,"https://salsa.debian.org/debian-iot-team/oauth2/hoel.git","https://github.com/babelouest/hoel",1340.3941203704,3,9,0,7,12,0,0,12,1,"1",1.75,2 -"html2text",1.3340380398,2.3215255445,0.7275451633,"https://salsa.debian.org/debian/html2text","https://github.com/grobian/html2text",1388.0924421296,5,7,0,7,21,0,0,23,1,"1",1.58333333333333,1.91304347826087 -"html5-parser",0.4588005785,2.4674305887,-0.084728594,"https://github.com/debian-calibre/html5-parser","https://github.com/debian-calibre/html5-parser",2309.5259259259,1,6,0,5,4,0,0,6,1,"1",1.85714285714286,1.66666666666667 -"hyphen",0.4314729534,1.6039540493,0.0503177929,"https://salsa.debian.org/libreoffice-team/hyphen","https://github.com/hunspell/hyphen.git",2824.9621875,2,9,0,6,18,0,0,19,2,"2",1.81818181818182,1.94736842105263 -"hyphen-ru",1.3639402124,5.60995268,0.0175129851,"http://github.com/Protagores/hyphen-ru","http://github.com/Protagores/hyphen-ru",3.0971875,0,1,0,0,0,0,0,0,1,"1",2,NA -"i18nspector",-0.3130156228,1.3470282705,-0.8210059464,"https://salsa.debian.org/debian/i18nspector","https://github.com/jwilk/i18nspector",3956.4540162037,0,2,0,2,6,0,0,7,3,"3",2,1.85714285714286 -"i2pd",-0.8587827802,0.1492942795,-1.1545577005,"https://salsa.debian.org/yangfl-guest/i2pd","https://github.com/PurpleI2P/i2pd",3747.1315856482,37,139,2,97,14,0,23,126,2,"2",1.78977272727273,1.11111111111111 -"i7z",0.0808738409,1.2622361789,-0.2430911659,"https://salsa.debian.org/debian/i7z","https://github.com/ajaiantilal/i7z",310.0352199074,0,7,0,3,33,0,0,35,1,"1",2,1.94285714285714 -"IanniX",-0.1880732304,2.1486905541,-0.8754662474,"https://salsa.debian.org/multimedia-team/iannix","https://github.com/buzzinglight/IanniX",4212.6902430556,7,14,0,10,41,0,3,45,3,"3",1.66666666666667,1.91111111111111 -"ibuffer-projectile",-0.7228061953,1.8154077231,-1.292148074,"https://salsa.debian.org/emacsen-team/ibuffer-projectile","https://github.com/purcell/ibuffer-projectile.git",3152.3891087963,1,7,0,7,14,0,0,14,2,"2",1.875,2 -"ice-builder-gradle-debian-packaging",-1.1849485707,0.9406079932,-1.6391429375,"https://github.com/zeroc-ice/ice-builder-gradle-debian-packaging.git","https://github.com/zeroc-ice/ice-builder-gradle-debian-packaging.git",2370.9240625,0,3,0,2,3,0,0,4,1,"1",2,1.75 -"icebreaker",0.4692256371,1.8411957204,-0.176942106,"https://salsa.debian.org/games-team/icebreaker","https://github.com/mattdm/icebreaker.git",3923.7699305556,0,5,0,4,7,0,0,7,3,"3",2,2 -"icemon",0.7030922937,3.5835100346,-0.2959059985,"https://salsa.debian.org/qt-kde-team/extras/icemon","https://github.com/icecc/icemon.git",4527.72,9,27,0,37,45,0,1,68,3,"3",1.75,1.66176470588235 -"icecream-sundae",-1.0385376489,1.8149325043,-1.7149505904,"https://salsa.debian.org/debian/icecream-sundae","https://github.com/JPEWdev/icecream-sundae",638.2833796296,3,6,0,6,16,0,0,16,1,"1",1.66666666666667,2 -"ifetch-tools",-1.7763116684,-1.4179435016,-1.8644650677,"https://github.com/unixabg/ifetch-tools","https://github.com/unixabg/ifetch-tools",5167.9663194445,0,4,0,3,2,0,0,3,4,"4",2,1.66666666666667 -"ifupdown-multi",-0.0008911093,3.5795714925,-1.035637135,"https://github.com/edmonds/ifupdown-multi","https://github.com/edmonds/ifupdown-multi",2598.1821759259,0,2,0,1,1,0,0,2,1,"1",2,1.5 -"inn",-0.504610683,-0.419983647,-0.5703395284,"https://salsa.debian.org/md/inn2","https://github.com/InterNetNews/inn.git",5725.5850115741,6,6,0,10,0,0,0,10,4,"4",1.5,1 -"iodine",-0.2722510221,-0.1412187428,-0.330852502,"https://git.toastfreeware.priv.at/debian/iodine.git/","https://github.com/yarrick/iodine.git",5593.1268634259,29,23,0,31,45,0,0,60,4,"4",1.44230769230769,1.75 -"ionit",-2.5676980502,-0.9981519368,-2.9844493768,"https://github.com/bdrung/ionit/tree/debian/unstable","https://github.com/bdrung/ionit",1307.9435069445,2,5,0,2,4,0,0,4,1,"1",1.71428571428571,2 -"ip4r",-1.4632745556,-0.4677957849,-1.7119933385,"https://salsa.debian.org/postgresql/ip4r","https://github.com/RhodiumToad/ip4r.git",3711.2765972222,1,6,0,5,22,0,0,23,2,"2",1.85714285714286,1.95652173913043 -"ipheth-debian",0.9430908027,3.7638258527,-0.137434873,"https://github.com/pmcenery/ipheth-debian","https://github.com/pmcenery/ipheth-debian",4243.6053819445,0,4,0,2,1,0,0,2,3,"3",2,1.5 -"ipmctl",-1.8038062885,-0.2344447385,-2.0696396657,"https://github.com/kilobyte/ipmctl/tree/debian","https://github.com/kilobyte/ipmctl",1854.5950810185,32,11,0,22,0,0,0,22,1,"1",1.25581395348837,1 -"ippusbxd",0.0111748533,2.660027865,-0.7220268879,"https://salsa.debian.org/printing-team/ippusbxd","https://github.com/OpenPrinting/ippusbxd",2327.0776967593,1,12,0,6,11,0,0,13,1,"1",1.92307692307692,1.84615384615385 -"iprange",0.6480375888,3.9597495364,-0.2945161283,"https://salsa.debian.org/debian/iprange","https://github.com/firehol/iprange.git",1873.7119328704,0,7,0,3,20,0,1,21,1,"1",2,1.95238095238095 -"iprutils",-1.9030231406,0.3339685092,-2.4460433686,"https://salsa.debian.org/debian/iprutils","https://github.com/bjking1/iprutils",5119.0450578704,18,20,0,15,14,0,0,22,4,"4",1.52631578947368,1.63636363636364 -"ipv6calc",0.5432988576,1.7634814459,-0.0022190697,"https://salsa.debian.org/debian/ipv6calc","https://github.com/pbiering/ipv6calc",5498.6132407407,2,10,5,7,16,0,0,19,4,"4",1.83333333333333,1.84210526315789 -"ipv6toolkit",0.1556183786,2.6785840103,-0.5536700112,"https://github.com/alvarezp/ipv6toolkit/tree/debian","https://github.com/alvarezp/ipv6toolkit",3020.5637962963,1,17,0,8,0,0,0,8,2,"2",1.94444444444444,1 -"pkg-ipvsadm",1.6190855359,2.7831585401,0.9056298919,"https://github.com/formorer/pkg-ipvsadm","https://github.com/formorer/pkg-ipvsadm",3173.692650463,1,2,0,2,3,0,0,4,2,"2",1.66666666666667,1.75 -"ipython_genutils",0.5301773312,3.2373221637,-0.0754853283,"https://salsa.debian.org/python-team/packages/ipython-genutils","https://github.com/ipython/ipython_genutils",4920.5252546296,2,28,3,27,23,0,0,43,3,"3",1.93333333333333,1.53488372093023 -"ir.lv2",0.0482033805,1.8072786295,-0.420434878,"https://salsa.debian.org/multimedia-team/ir.lv2","https://github.com/tomszilagyi/ir.lv2.git",901.6371759259,2,4,0,0,1,0,0,1,1,"1",1.66666666666667,2 -"sptable",-0.3572895376,2.8910468841,-1.1439831667,"https://salsa.debian.org/debian-astro-team/iraf-sptable","https://github.com/iraf-community/sptable",2001.9924189815,2,4,0,1,3,0,0,3,1,"1",1.66666666666667,2 -"ircmarkers",-1.4435928142,0.7583118463,-1.9125989528,"https://github.com/df7cb/ircmarkers","https://github.com/df7cb/ircmarkers",5694.8846527778,1,3,0,3,1,0,0,3,4,"4",1.75,1.33333333333333 -"jack_midi_clock",0.3118920052,2.9552674463,-0.4056573573,"https://salsa.debian.org/multimedia-team/jack-midi-clock","https://github.com/x42/jack_midi_clock",4775.6370949074,0,4,0,3,3,0,0,4,3,"3",2,1.75 -"jackson-dataformat-yaml",-0.30501226,2.808298895,-1.2455361494,"https://salsa.debian.org/java-team/jackson-dataformat-yaml","https://github.com/FasterXML/jackson-dataformat-yaml.git",2094.1709722222,1,22,0,16,0,0,4,20,1,"1",1.95652173913043,1 -"jaraco.itertools",-2.1770715585,0.4444182514,-2.9053425973,"https://salsa.debian.org/python-team/packages/jaraco.itertools","https://github.com/jaraco/jaraco.itertools.git",3229.3396990741,17,5,0,18,7,0,0,21,2,"2",1.22727272727273,1.33333333333333 -"java-atk-wrapper",0.561521277,1.2449834534,0.2042642146,"https://salsa.debian.org/a11y-team/java-atk-wrapper","https://github.com/GNOME/java-atk-wrapper",5298.5764814815,11,11,0,8,3,0,0,11,4,"4",1.5,1.27272727272727 -"JDim",-1.0625455629,0.9599464829,-1.4721593744,"https://salsa.debian.org/debian/jdim","https://github.com/JDimproved/JDim.git",5782.9914467593,2,15,0,8,9,0,0,9,4,"4",1.88235294117647,2 -"jhead",-0.1046962169,0.0128556712,-0.1619952781,"https://salsa.debian.org/reichel/jhead","https://github.com/Matthias-Wandel/jhead",974.1013078704,4,13,0,10,49,0,0,49,1,"1",1.76470588235294,2 -"jinja2-time",-0.4698555936,1.1570025567,-0.7656248707,"https://salsa.debian.org/python-team/packages/jinja2-time","https://github.com/hackebrot/jinja2-time",2112.1138657407,0,3,0,2,20,0,0,20,1,"1",2,2 -"jitterdebugger",-2.3485028902,-0.1533055837,-2.7859741296,"https://salsa.debian.org/debian/jitterdebugger","https://github.com/igaw/jitterdebugger.git",1214.2022916667,8,3,0,9,12,0,0,13,1,"1",1.27272727272727,1.92307692307692 -"jitterentropy-rngd",-1.0568983374,-0.2694182082,-1.1867836067,"https://salsa.debian.org/debian/jitterentropy-rngd","https://github.com/smuellerDD/jitterentropy-rngd",2267.9794675926,9,1,0,10,33,0,0,33,1,"1",1.1,2 -"jmxetric",-2.9017326958,-0.7363274677,-3.3243552835,"https://github.com/ganglia/jmxetric","https://github.com/ganglia/jmxetric",2292.7484027778,0,9,0,5,14,0,0,16,1,"1",2,1.875 -"jp2a",0.9044983067,3.5392448615,-0.0351520282,"https://salsa.debian.org/debian/jp2a","https://github.com/Talinx/jp2a",2190.7298032407,3,4,0,6,11,0,0,13,1,"1",1.57142857142857,1.84615384615385 -"jupyter-sphinx-theme",-0.4091049447,-0.045316663,-0.4899605303,"https://salsa.debian.org/python-team/packages/jupyter-sphinx-theme","https://github.com/jupyter/jupyter-sphinx-theme",1834.3539467593,2,32,0,24,12,0,0,30,1,"1",1.94117647058824,1.4 -"kamcli",-4.7786388825,-2.4182541708,-5.4179403291,"https://salsa.debian.org/pkg-voip-team/kamcli/","https://github.com/kamailio/kamcli",3121.9156134259,1,5,0,5,8,0,0,8,2,"2",1.83333333333333,2 -"kamerka",0.8743124322,3.7857646393,-0.1312218342,"http://github.com/dos1/kamerka","http://github.com/dos1/kamerka",2873.9879282407,7,12,1,0,0,0,0,0,2,"2",1.63157894736842,NA -"debian-karlyriceditor",-0.1145592946,2.7444681458,-1.0688808595,"https://github.com/martin-steghoefer/debian-karlyriceditor","https://github.com/martin-steghoefer/debian-karlyriceditor",1746.0329513889,1,1,0,2,0,0,0,2,1,"1",1.5,1 -"kbtin",-0.2885497121,1.2472045448,-0.639846297,"https://github.com/kilobyte/kbtin/tree/debian","https://github.com/kilobyte/kbtin",5761.0344212963,1,4,0,3,7,0,0,7,4,"4",1.8,2 -"kcemu-debian",-1.5465318214,-0.3965547601,-1.8452569055,"https://github.com/glaubitz/kcemu-debian","https://github.com/glaubitz/kcemu-debian",4222.8273842593,2,2,0,1,0,0,0,1,3,"3",1.5,1 -"kchmviewer",0.9382066218,2.3758050403,0.2613367395,"https://salsa.debian.org/qt-kde-team/extras/kchmviewer","https://github.com/gyunaev/kchmviewer",2255.6306481482,1,6,0,4,23,0,0,23,1,"1",1.85714285714286,2 -"kcmsystemd-debian",0.7599629002,3.9388494787,-0.1577270679,"https://github.com/shsorbom/kcmsystemd-debian.git","https://github.com/shsorbom/kcmsystemd-debian.git",684.1522685185,1,12,0,8,3,0,0,9,1,"1",1.92307692307692,1.33333333333333 -"keychain",1.0933393106,2.2752386059,0.4360362266,"https://salsa.debian.org/debian/keychain","https://github.com/funtoo/keychain",3125.5103356482,23,18,0,32,53,0,0,63,2,"2",1.4390243902439,1.84126984126984 -"khard",0.0842088929,2.5350536215,-0.5777839137,"https://salsa.debian.org/python-team/packages/khard","https://github.com/lucc/khard",3364.3432523148,16,20,1,32,41,0,0,63,2,"2",1.55555555555556,1.65079365079365 -"kim-api",-0.8423857472,1.4393693103,-1.2913134011,"https://salsa.debian.org/science-team/kim-api","https://github.com/openkim/kim-api",4210.4546527778,1,26,1,10,24,0,1,26,3,"3",1.96296296296296,1.92307692307692 -"kindleclip",-0.8974283368,0.9569429807,-1.3449393666,"https://github.com/gwolf/kindleclip","https://github.com/gwolf/kindleclip",1841.0025925926,0,1,0,1,7,0,0,7,1,"1",2,2 -"javadev",-0.406165741,0.7632042123,-0.7000750742,"https://salsa.debian.org/med-team/king","https://github.com/rlabduke/javadev.git",5017.5933217593,0,15,0,1,3,0,0,4,4,"4",2,1.75 -"kismet-debian",1.9335416891,2.9570779251,1.2756598324,"https://github.com/andrikos/kismet-debian","https://github.com/andrikos/kismet-debian",1415.5860300926,0,1,0,1,0,0,0,1,1,"1",2,1 -"clj-kitchensink",-0.6039126858,2.5849138336,-1.5600356447,"https://salsa.debian.org/clojure-team/kitchensink-clojure","https://github.com/puppetlabs/clj-kitchensink.git",3697.8495138889,12,47,0,34,0,0,0,34,2,"2",1.79661016949153,1 -"klatexformula_debian",-0.2602166071,0.57054691,-0.5330870672,"https://github.com/TobiasWinchen/klatexformula_debian","https://github.com/TobiasWinchen/klatexformula_debian",3554.8463541667,0,6,0,3,1,0,0,3,2,"2",2,1.33333333333333 -"debian-ksmtuned",0.6468606724,3.7904647882,-0.3169526232,"https://github.com/bzed/debian-ksmtuned","https://github.com/bzed/debian-ksmtuned",2027.7201157408,1,1,0,2,2,0,0,3,1,"1",1.5,1.66666666666667 -"kylin-burner",0.5891863927,3.7002638946,-0.3231693637,"https://github.com/ukui/kylin-burner","https://github.com/ukui/kylin-burner",1294.0143055556,2,9,0,4,7,0,0,8,1,"1",1.81818181818182,1.875 -"kylin-display-switch",-1.7366978486,1.7252586454,-2.558884793,"https://github.com/ukui/kylin-display-switch","https://github.com/ukui/kylin-display-switch",1387.1396296296,4,11,0,10,8,0,0,12,1,"1",1.73333333333333,1.66666666666667 -"lablgtk-extras",-0.8756228195,2.0634481167,-1.8186386711,"https://salsa.debian.org/ocaml-team/lablgtk-extras","https://github.com/zoggy/lablgtk-extras.git",3792.5139930556,0,3,0,1,2,0,0,2,3,"3",2,2 -"labltk",-0.1496995002,2.0785630827,-0.594072233,"https://salsa.debian.org/ocaml-team/labltk","https://github.com/garrigue/labltk.git",3339.1637268519,1,3,0,3,27,0,0,28,2,"2",1.75,1.96428571428571 -"laby",1.665594867,5.3198865227,0.3634891036,"https://salsa.debian.org/ocaml-team/laby","https://github.com/sgimenez/laby.git",2556.9824884259,11,12,0,15,44,0,7,56,1,"1",1.52173913043478,1.78571428571429 -"coffee",-0.8084062082,0.1539618161,-0.9674228878,"https://salsa.debian.org/debian/latex-coffee-stains","https://github.com/Echsecutor/coffee",1954.8484027778,1,7,0,3,2,0,0,3,1,"1",1.875,1.66666666666667 -"latexmk",2.3142169158,4.8870249679,1.1895147626,"https://github.com/debian-tex/latexmk","https://github.com/debian-tex/latexmk",1865.2669907407,3,7,0,5,3,0,0,5,1,"1",1.7,1.6 -"latexml",0.5426184631,2.9655400064,-0.3271877484,"https://github.com/debian-tex/latexml","https://github.com/debian-tex/latexml",2055.9208333333,2,6,0,4,1,0,0,4,1,"1",1.75,1.25 -"pkg-lava-tool",-1.5553171291,-0.4092627761,-1.882507141,"https://github.com/Linaro/pkg-lava-tool","https://github.com/Linaro/pkg-lava-tool",2892.9631481482,0,21,0,7,2,0,0,7,2,"2",2,1.28571428571429 -"pkg-lavapdu",-1.360190138,0.6576027042,-1.9660643803,"https://github.com/Linaro/pkg-lavapdu","https://github.com/Linaro/pkg-lavapdu",1898.0415972222,9,22,0,16,6,0,0,19,1,"1",1.70967741935484,1.31578947368421 -"lazyarray",-1.6930876257,1.5097154973,-2.5262604044,"https://salsa.debian.org/science-team/lazyarray","https://github.com/NeuralEnsemble/lazyarray",3518.1808333333,0,8,0,4,5,0,0,6,2,"2",2,1.83333333333333 -"lbzip2",0.4553413125,1.9206872689,-0.0826154573,"https://github.com/kjn/lbzip2/tree/debian","https://github.com/kjn/lbzip2",2710.187037037,0,3,0,1,4,0,1,5,1,"1",2,1.8 -"lcdf-typetools",0.5850757713,1.6610997166,0.0976153045,"https://salsa.debian.org/fonts-team/lcdf-typetools","https://github.com/kohler/lcdf-typetools.git",5649.3697337963,4,5,0,6,27,0,0,28,4,"4",1.55555555555556,1.96428571428571 -"acme-poe-knee",-1.8444968736,-0.7377441759,-2.0661466284,"https://salsa.debian.org/perl-team/modules/packages/libacme-poe-knee-perl","https://github.com/jib/acme-poe-knee.git",0,0,1,0,1,0,0,0,1,NA,NA,2,1 -"Alien-SDL",-0.0977796476,0.3529808751,-0.1969931002,"https://salsa.debian.org/perl-team/modules/packages/libalien-sdl-perl","https://github.com/PerlGameDev/Alien-SDL.git",2024.7772222222,0,15,0,7,10,0,0,12,1,"1",2,1.83333333333333 -"ambix",-0.2891761381,1.5956439603,-0.6870161119,"https://salsa.debian.org/multimedia-team/libambix","https://github.com/iem-projects/ambix.git",2332.8963194445,2,15,0,3,2,0,0,4,1,"1",1.88235294117647,1.5 -"apache-singleton",-1.4918758035,1.0630563092,-2.2427825215,"https://salsa.debian.org/perl-team/modules/packages/libapache-singleton-perl","https://github.com/mschout/apache-singleton.git",2808.9702777778,2,1,0,2,0,0,0,2,2,"2",1.33333333333333,1 -"mod_authnz_pam",-0.1714935794,2.2098425672,-0.8074827861,"https://salsa.debian.org/freeipa-team/mod-authnz-pam","https://github.com/adelton/mod_authnz_pam.git",3451.9741203704,6,1,0,5,17,0,0,18,2,"2",1.14285714285714,1.94444444444444 -"App-CPANTS-Lint",-0.2108873196,3.0022710317,-1.1931665391,"https://salsa.debian.org/perl-team/modules/packages/libapp-cpants-lint-perl","https://github.com/charsbar/App-CPANTS-Lint.git",177.5091782407,0,3,0,3,4,0,0,4,1,"1",2,2 -"p5-app-perlrdf-command-query",-2.5195716821,-0.1728085325,-3.0060090978,"https://salsa.debian.org/perl-team/modules/packages/libapp-perlrdf-command-query-perl","https://github.com/tobyink/p5-app-perlrdf-command-query",786.4794675926,0,1,0,1,1,0,0,2,1,"1",2,1.5 -"Archive-Ar",-0.7153173845,1.4218992511,-1.4262008359,"https://salsa.debian.org/perl-team/modules/packages/libarchive-ar-perl","https://github.com/jbazik/Archive-Ar.git",1734.3291435185,1,5,0,2,4,0,0,4,1,"1",1.83333333333333,2 -"libaria",-0.4287076752,2.5333867692,-1.5521033494,"https://github.com/jksrecko/libaria","https://github.com/jksrecko/libaria",1255.0196875,1,2,0,2,3,0,0,4,1,"1",1.66666666666667,1.75 -"perl-Array-Iterator",-1.1520508851,1.0062186595,-1.5899210944,"https://salsa.debian.org/perl-team/modules/packages/libarray-iterator-perl","https://github.com/perlancar/perl-Array-Iterator.git",4456.1288194445,1,16,0,6,7,0,0,8,3,"3",1.94117647058824,1.875 -"Astro-FITS-CFITSIO",-0.284600426,1.0728247575,-0.745324073,"https://salsa.debian.org/perl-team/modules/packages/libastro-fits-cfitsio-perl","https://github.com/pratzlaff/Astro-FITS-CFITSIO",41.8160185185,1,3,0,2,1,0,0,2,1,"1",1.75,1.5 -"AtomBus",-2.9184975503,-0.9823925311,-3.3182517592,"https://salsa.debian.org/perl-team/modules/packages/libatombus-perl","https://github.com/ironcamel/AtomBus.git",574.4602777778,0,2,0,2,4,0,0,4,1,"1",2,2 -"p5-atteanx-compatibility-trine",-5.221355937,-3.8031880755,-5.4863317126,"https://salsa.debian.org/perl-team/modules/packages/libatteanx-compatibility-trine-perl","https://github.com/kjetilk/p5-atteanx-compatibility-trine.git",174.8482291667,0,1,0,2,4,0,0,4,1,"1",2,2 -"atteanx-endpoint",-5.0524581401,-2.9636769875,-5.4798110024,"https://salsa.debian.org/perl-team/modules/packages/libatteanx-endpoint-perl","https://github.com/kasei/atteanx-endpoint.git",581.8788078704,0,3,0,2,1,0,0,2,1,"1",2,1.5 -"p5-atteanx-store-sparql",-3.6547632503,-1.1140927923,-4.301232368,"https://salsa.debian.org/perl-team/modules/packages/libatteanx-store-sparql-perl","https://github.com/kjetilk/p5-atteanx-store-sparql.git",1578.1186458333,1,3,0,4,5,0,0,5,1,"1",1.75,2 -"perl-Authen-Captcha",-0.8189234623,0.262039817,-1.0902527604,"https://salsa.debian.org/perl-team/modules/packages/libauthen-captcha-perl","https://github.com/lkundrak/perl-Authen-Captcha.git",604.0063194444,4,2,0,4,1,0,0,5,1,"1",1.33333333333333,1.2 -"B-Hooks-OP-Check",0.6263225059,3.4250343136,-0.0183739613,"https://salsa.debian.org/perl-team/modules/packages/libb-hooks-op-check-perl","https://github.com/karenetheridge/B-Hooks-OP-Check",4225.8527430556,1,3,0,3,0,0,0,3,3,"3",1.75,1 -"B-Hooks-Parser",-1.1725055097,-0.0976957027,-1.3418704161,"https://salsa.debian.org/perl-team/modules/packages/libb-hooks-parser-perl","https://github.com/karenetheridge/B-Hooks-Parser.git",3844.972962963,4,3,0,6,6,0,0,9,3,"3",1.42857142857143,1.66666666666667 -"b-utils",-0.2233577064,1.2899551919,-0.5541961272,"https://salsa.debian.org/perl-team/modules/packages/libb-utils-perl","https://github.com/jbenjore/b-utils.git",1697.3214351852,0,9,0,2,12,0,0,12,1,"1",2,2 -"libb2",0.4344926484,2.4059587424,-0.0945466725,"https://salsa.debian.org/debian/libb2","https://github.com/BLAKE2/libb2.git",2769.1435185185,5,14,0,15,43,0,0,44,2,"2",1.73684210526316,1.97727272727273 -"backuppc-xs",0.0682740707,4.0111217079,-0.9932975309,"https://salsa.debian.org/debian/libbackuppc-xs-perl","https://github.com/backuppc/backuppc-xs.git",1496.301400463,2,5,0,2,11,0,0,11,1,"1",1.71428571428571,2 -"libbase58",-0.3899391721,2.4680002613,-1.1487322403,"https://salsa.debian.org/debian/libbase58","https://github.com/luke-jr/libbase58",2238.1648148148,3,7,0,8,0,0,0,8,1,"1",1.7,1 -"libbde",0.3715579957,2.3531465313,-0.2679169251,"https://salsa.debian.org/pkg-security-team/libbde","https://github.com/libyal/libbde",2546.6279398148,2,1,0,3,54,0,2,56,1,"1",1.33333333333333,1.96428571428571 -"BerkeleyDB",0.094191881,0.6104187657,-0.0890236719,"https://salsa.debian.org/md/libberkeleydb-perl","https://github.com/pmqs/BerkeleyDB.git",5644.9127083333,1,4,0,3,5,0,0,5,4,"4",1.8,2 -"bio-alignio-stockholm",-4.9835930933,-2.6349248881,-5.4713428559,"https://salsa.debian.org/med-team/libbio-alignio-stockholm-perl","https://github.com/bioperl/bio-alignio-stockholm.git",10.2199305556,0,2,0,2,0,0,0,2,1,"1",2,1 -"bio-cluster",-0.7997866799,1.4401770295,-1.3214678694,"https://salsa.debian.org/med-team/libbio-cluster-perl","https://github.com/bioperl/bio-cluster.git",7.3618171296,0,2,0,2,2,0,0,3,1,"1",2,1.66666666666667 -"bio-db-embl",-3.9031050099,-1.6133202421,-4.3425936432,"https://salsa.debian.org/med-team/libbio-db-embl-perl","https://github.com/bioperl/bio-db-embl.git",156.3099421296,0,2,0,2,2,0,0,3,1,"1",2,1.66666666666667 -"bioparser",-1.0837320242,1.8160602363,-1.7618255497,"https://salsa.debian.org/med-team/libbioparser-dev","https://github.com/rvaser/bioparser",2526.0444675926,2,4,0,2,7,0,0,7,1,"1",1.66666666666667,2 -"bot-training",-3.2750745336,-1.1281011499,-3.7406250651,"https://salsa.debian.org/perl-team/modules/packages/libbot-training-perl","https://github.com/avar/bot-training.git",3166.8061805556,0,2,0,2,3,0,0,3,2,"2",2,2 -"bpp-core",-0.3055083002,1.3427773866,-0.9266820803,"https://salsa.debian.org/med-team/libbpp-core","https://github.com/BioPP/bpp-core",4797.1825925926,3,24,0,9,13,0,0,14,3,"3",1.88888888888889,1.92857142857143 -"bpp-phyl",-0.6908318666,0.5108256238,-1.0987919805,"https://salsa.debian.org/med-team/libbpp-phyl","https://github.com/BioPP/bpp-phyl.git",5775.3533796296,2,40,0,11,26,0,0,30,4,"4",1.95238095238095,1.86666666666667 -"bpp-phyl-omics",-0.3598958857,2.0635272475,-1.1073993387,"https://salsa.debian.org/med-team/libbpp-phyl-omics","https://github.com/BioPP/bpp-phyl-omics.git",4025.9415046296,0,9,0,3,3,0,0,4,3,"3",2,1.75 -"bpp-popgen",-0.5271533507,1.1251682809,-1.1042333821,"https://salsa.debian.org/med-team/libbpp-popgen","https://github.com/BioPP/bpp-popgen",5514.9573032407,1,13,0,4,2,0,0,4,4,"4",1.92857142857143,1.5 -"bpp-qt",-0.0541983729,2.8865148932,-1.0203907927,"https://salsa.debian.org/med-team/libbpp-qt","https://github.com/BioPP/bpp-qt",5024.8754050926,0,12,0,3,1,0,0,3,4,"4",2,1.33333333333333 -"bpp-raa",-0.4695334076,2.4236088145,-1.4371504644,"https://salsa.debian.org/med-team/libbpp-raa","https://github.com/BioPP/bpp-raa",5066.2362962963,0,17,0,4,1,0,0,4,4,"4",2,1.25 -"bpp-seq",-0.7192518957,0.6394875381,-1.1233907337,"https://salsa.debian.org/med-team/libbpp-seq","https://github.com/BioPP/bpp-seq",5747.7503472222,1,22,0,5,7,0,0,9,4,"4",1.95652173913043,1.77777777777778 -"bpp-seq-omics",-0.4569335369,1.1913544639,-1.0602096041,"https://salsa.debian.org/med-team/libbpp-seq-omics","https://github.com/BioPP/bpp-seq-omics.git",4806.9277083333,0,14,0,4,5,0,0,6,3,"3",2,1.83333333333333 -"bultitude",-1.4773927994,1.1163772935,-2.107348178,"https://salsa.debian.org/clojure-team/libbultitude-clojure","https://github.com/TimoFreiberg/bultitude.git",2812.2660300926,1,20,0,15,5,0,0,18,2,"2",1.95238095238095,1.27777777777778 -"Business-EDI",-3.9144500578,-1.6606272938,-4.344431509,"https://salsa.debian.org/perl-team/modules/packages/libbusiness-edi-perl","https://github.com/atz/Business-EDI.git",1031.8625925926,0,2,0,1,2,0,0,2,1,"1",2,2 -"business-isbn",0.4456335938,2.2644684353,-0.07414136,"https://salsa.debian.org/perl-team/modules/packages/libbusiness-isbn-perl","https://github.com/briandfoy/business-isbn.git",5456.629849537,2,8,0,6,17,0,0,19,4,"4",1.8,1.89473684210526 -"libcaca",1.7158261148,2.8952023479,1.0094395421,"https://salsa.debian.org/multimedia-team/libcaca","https://github.com/cacalabs/libcaca.git",5032.4727199074,5,18,0,13,72,0,0,75,4,"4",1.78260869565217,1.96 -"cache-historical-perl",-2.3954691781,0.151997288,-2.9853546683,"https://salsa.debian.org/perl-team/modules/packages/libcache-historical-perl","https://github.com/mschilli/cache-historical-perl.git",1172.6421064815,1,1,0,2,0,0,0,2,1,"1",1.5,1 -"Cache-Memcached-Fast",0.4990329576,3.9172913613,-0.4350811541,"https://salsa.debian.org/perl-team/modules/packages/libcache-memcached-fast-perl","https://github.com/JRaspass/Cache-Memcached-Fast.git",5347.5680324074,1,11,0,8,23,0,0,23,4,"4",1.91666666666667,2 -"libcap-ng",0.8396700265,1.681480669,0.3896198847,"https://salsa.debian.org/debian/libcap-ng","https://github.com/stevegrubb/libcap-ng",2330.4456365741,16,5,0,19,22,0,0,29,1,"1",1.23809523809524,1.75862068965517 -"libcapi20",0.8368813861,2.3931041059,0.2031772198,"https://github.com/leggewie-DM/libcapi20","https://github.com/leggewie-DM/libcapi20",1469.2789236111,0,1,0,1,1,0,0,2,1,"1",2,1.5 -"Catalyst-Authentication-Credential-HTTP",-0.5445869591,1.7237240173,-0.9848916986,"https://salsa.debian.org/perl-team/modules/packages/libcatalyst-authentication-credential-http-perl","https://github.com/perl-catalyst/Catalyst-Authentication-Credential-HTTP",3862.9087152778,0,7,0,7,0,0,0,7,3,"3",2,1 -"catalyst-dispatch-regex",-0.2606173856,1.8455952252,-0.6908933433,"https://salsa.debian.org/perl-team/modules/packages/libcatalyst-dispatchtype-regex-perl","https://github.com/mvgrimes/catalyst-dispatch-regex.git",733.893287037,0,2,0,2,3,0,0,3,1,"1",2,2 -"Catalyst-Model-DBIC-Schema",0.0213319889,2.940935467,-0.7164785923,"https://salsa.debian.org/perl-team/modules/packages/libcatalyst-model-dbic-schema-perl","https://github.com/perl-catalyst/Catalyst-Model-DBIC-Schema",5560.3081828704,1,18,0,13,3,0,0,16,4,"4",1.94736842105263,1.1875 -"Catmandu-Atom",-2.0448922521,-0.090192519,-2.4689508151,"https://salsa.debian.org/perl-team/modules/packages/libcatmandu-atom-perl","https://github.com/LibreCat/Catmandu-Atom.git",2313.0128472222,0,6,0,5,2,0,0,5,1,"1",2,1.4 -"Catmandu-FileStore",-4.6751603427,-1.9416786358,-5.4067542228,"https://salsa.debian.org/perl-team/modules/packages/libcatmandu-filestore-perl","https://github.com/LibreCat/Catmandu-FileStore.git",1680.9195138889,0,7,0,6,8,0,0,8,1,"1",2,2 -"Catmandu-Importer-getJSON",-1.1909213366,1.1095653007,-1.9138474886,"https://salsa.debian.org/perl-team/modules/packages/libcatmandu-importer-getjson-perl","https://github.com/nichtich/Catmandu-Importer-getJSON.git",2053.8504513889,2,5,0,5,11,0,0,12,1,"1",1.71428571428571,1.91666666666667 -"Catmandu-MAB2",-2.1995168172,-0.5970612736,-2.5957637184,"https://salsa.debian.org/perl-team/modules/packages/libcatmandu-mab2-perl","https://github.com/jorol/Catmandu-MAB2.git",2364.9603356482,0,4,0,2,7,0,0,7,1,"1",2,2 -"Catmandu-RDF",-1.5674004847,0.7873124502,-2.1156699483,"https://salsa.debian.org/perl-team/modules/packages/libcatmandu-rdf-perl","https://github.com/LibreCat/Catmandu-RDF.git",3436.1034722222,1,7,0,4,19,0,1,21,2,"2",1.875,1.9047619047619 -"Catmandu-SRU",-1.6347444625,0.7856473937,-2.213169114,"https://salsa.debian.org/perl-team/modules/packages/libcatmandu-sru-perl","https://github.com/LibreCat/Catmandu-SRU.git",3182.483275463,4,14,0,8,13,0,0,14,2,"2",1.77777777777778,1.92857142857143 -"Catmandu-Store-MongoDB",-2.1900265394,0.0427518931,-2.6176713043,"https://salsa.debian.org/perl-team/modules/packages/libcatmandu-store-mongodb-perl","https://github.com/LibreCat/Catmandu-Store-MongoDB.git",3318.0048263889,0,6,0,4,6,0,0,6,2,"2",2,2 -"Catmandu-Wikidata",-1.8751171258,0.7106805559,-2.4545693893,"https://salsa.debian.org/perl-team/modules/packages/libcatmandu-wikidata-perl","https://github.com/nichtich/Catmandu-Wikidata.git",3124.955462963,0,3,0,1,4,0,1,5,2,"2",2,1.8 -"cgi-application-server",-1.3503684925,1.1163471363,-2.0606594531,"https://salsa.debian.org/perl-team/modules/packages/libcgi-application-server-perl","https://github.com/rjbs/cgi-application-server.git",2084.0161111111,0,3,0,2,2,0,0,4,1,"1",2,1.5 -"CGI-Expand",-0.5995119077,1.6030547825,-1.0867729842,"https://salsa.debian.org/perl-team/modules/packages/libcgi-expand-perl","https://github.com/bowman/CGI-Expand.git",1724.580462963,2,5,0,2,1,0,0,2,1,"1",1.71428571428571,1.5 -"CGI-Session-ExpireSessions",-2.1411258628,-0.6175205041,-2.4722907936,"https://salsa.debian.org/perl-team/modules/packages/libcgi-session-expiresessions-perl","https://github.com/ronsavage/CGI-Session-ExpireSessions",152.6683333333,0,1,0,1,2,0,0,2,1,"1",2,2 -"Chatbot-Eliza",-1.3144935043,1.2362568323,-1.8965557655,"https://salsa.debian.org/perl-team/modules/packages/libchatbot-eliza-perl","https://github.com/ggruen/Chatbot-Eliza",2872.7296875,1,4,0,2,0,0,0,2,2,"2",1.8,1 -"chi-driver-redis",-1.0562831931,1.2500992113,-1.5273046989,"https://salsa.debian.org/perl-team/modules/packages/libchi-driver-redis-perl","https://github.com/rentrak/chi-driver-redis",2250.5063078704,1,6,0,4,5,0,0,6,1,"1",1.85714285714286,1.83333333333333 -"libcitygml",-1.0898756324,0.0704593832,-1.422660328,"https://salsa.debian.org/debian-gis-team/libcitygml","https://github.com/jklimke/libcitygml.git",4063.0042476852,3,34,0,18,41,0,0,42,3,"3",1.91891891891892,1.97619047619048 -"class-c3-adopt-next",-0.163979537,2.015060941,-0.6012557543,"https://salsa.debian.org/perl-team/modules/packages/libclass-c3-adopt-next-perl","https://github.com/rafl/class-c3-adopt-next.git",539.1778587963,0,4,0,2,0,0,0,2,1,"1",2,1 -"Class-Container",-0.0506280246,1.6643843634,-0.4036695635,"https://salsa.debian.org/perl-team/modules/packages/libclass-container-perl","https://github.com/kenahoo/Class-Container.git",1.6649189815,1,3,0,3,3,0,0,3,1,"1",1.75,2 -"class-insideout",-0.6783523447,1.0454132392,-0.9711596731,"https://salsa.debian.org/perl-team/modules/packages/libclass-insideout-perl","https://github.com/dagolden/class-insideout.git",3195.8285300926,0,3,0,2,8,0,0,8,2,"2",2,2 -"class-meta",-2.1588155835,0.1407589648,-2.6165631943,"https://salsa.debian.org/perl-team/modules/packages/libclass-meta-perl","https://github.com/theory/class-meta.git",2689.2590856482,0,3,0,2,3,0,0,3,1,"1",2,2 -"class-refresh",-1.6945342203,0.5207835259,-2.147534344,"https://salsa.debian.org/perl-team/modules/packages/libclass-refresh-perl","https://github.com/doy/class-refresh.git",1057.1042708333,0,3,0,3,6,0,0,6,1,"1",2,2 -"libcleri",-2.6428568291,0.0499127531,-3.28649977,"https://salsa.debian.org/siridb-team/libcleri","https://github.com/cesbit/libcleri.git",2711.9692592593,2,9,0,4,7,0,0,8,1,"1",1.81818181818182,1.875 -"config-auto",0.2333854777,2.0661047236,-0.2396184716,"https://salsa.debian.org/perl-team/modules/packages/libconfig-auto-perl","https://github.com/jib/config-auto.git",2192.3712731482,2,3,0,1,2,0,0,3,1,"1",1.6,1.66666666666667 -"Config-Identity",-1.1292654123,1.0457452223,-1.5624237769,"https://salsa.debian.org/perl-team/modules/packages/libconfig-identity-perl","https://github.com/dagolden/Config-Identity.git",2902.5731828704,0,4,0,3,2,0,0,4,2,"2",2,1.5 -"perl-Convert-ASN1",0.4197948981,1.947299648,-0.0317401557,"https://salsa.debian.org/perl-team/modules/packages/libconvert-asn1-perl","https://github.com/gbarr/perl-Convert-ASN1.git",5538.4047453704,6,11,0,13,39,0,0,41,4,"4",1.64705882352941,1.95121951219512 -"convert-binhex",0.5297090391,2.6158283055,-0.0231792705,"https://salsa.debian.org/perl-team/modules/packages/libconvert-binhex-perl","https://github.com/stephenenelson/convert-binhex.git",816.5657407407,0,2,0,2,2,0,0,3,1,"1",2,1.66666666666667 -"CPAN-DistnameInfo",0.2522399529,2.0212536151,-0.1714651554,"https://salsa.debian.org/perl-team/modules/packages/libcpan-distnameinfo-perl","https://github.com/gbarr/CPAN-DistnameInfo.git",2596.9826157407,4,4,0,6,11,0,0,16,1,"1",1.5,1.6875 -"perl-crypt-cracklib",-0.6543542036,2.0569886418,-1.4105292586,"https://salsa.debian.org/perl-team/modules/packages/libcrypt-cracklib-perl","https://github.com/dsully/perl-crypt-cracklib.git",1122.6671643519,0,2,0,1,5,0,0,5,1,"1",2,2 -"Crypt-DH-GMP",-0.2521104835,0.8592315725,-0.4600056877,"https://salsa.debian.org/perl-team/modules/packages/libcrypt-dh-gmp-perl","https://github.com/lestrrat/Crypt-DH-GMP.git",1507.2044791667,0,3,0,2,2,0,0,3,1,"1",2,1.66666666666667 -"crypt-dh",-0.350596725,1.4226875994,-0.742243187,"https://salsa.debian.org/perl-team/modules/packages/libcrypt-dh-perl","https://github.com/wchristian/crypt-dh.git",6.7348726852,0,3,0,2,0,0,0,2,1,"1",2,1 -"perl-Crypt-OpenSSL-Bignum",0.573671133,2.817673072,-0.0231679046,"https://salsa.debian.org/perl-team/modules/packages/libcrypt-openssl-bignum-perl","https://github.com/kmx/perl-Crypt-OpenSSL-Bignum.git",1031.4781134259,1,6,0,3,7,0,0,8,1,"1",1.85714285714286,1.875 -"perl-crypt-openssl-pkcs10",-0.3431098229,2.5077909436,-1.1135889242,"https://salsa.debian.org/perl-team/modules/packages/libcrypt-openssl-pkcs10-perl","https://github.com/perl-openssl/perl-crypt-openssl-pkcs10.git",84.9646875,1,2,0,1,1,0,0,1,1,"1",1.66666666666667,2 -"Crypt-OpenSSL-RSA",0.4685020789,2.4809174365,-0.0400198203,"https://salsa.debian.org/perl-team/modules/packages/libcrypt-openssl-rsa-perl","https://github.com/toddr/Crypt-OpenSSL-RSA.git",4592.8473842593,12,12,0,16,31,0,0,35,3,"3",1.5,1.88571428571429 -"crypt-saltedhash",-0.4905719307,1.6402467611,-0.9344153294,"https://salsa.debian.org/perl-team/modules/packages/libcrypt-saltedhash-perl","https://github.com/campus-explorer/crypt-saltedhash",137.0340162037,2,4,0,4,7,0,0,8,1,"1",1.66666666666667,1.875 -"CSS-Tiny",-0.2187157738,2.0546898664,-0.9614626512,"https://salsa.debian.org/perl-team/modules/packages/libcss-tiny-perl","https://github.com/chorny/CSS-Tiny.git",2896.0719791667,1,2,0,3,0,0,0,3,2,"2",1.66666666666667,1 -"libcue",1.3280527366,4.5646098156,0.2528534907,"https://salsa.debian.org/debian/libcue","https://github.com/lipnitsk/libcue",5295.1366435185,10,5,0,13,29,0,0,29,4,"4",1.33333333333333,2 -"libcypher-parser",-0.5122868361,1.7043358431,-0.9505714794,"https://github.com/cleishm/libcypher-parser","https://github.com/cleishm/libcypher-parser",2052.1131134259,4,8,0,4,34,0,1,35,1,"1",1.66666666666667,1.97142857142857 -"Dancer-Plugin-REST",-1.332193545,1.346725582,-1.9482623921,"https://salsa.debian.org/perl-team/modules/packages/libdancer-plugin-rest-perl","https://github.com/perldancer/Dancer-Plugin-REST.git",1451.9472800926,1,5,0,2,4,0,0,6,1,"1",1.83333333333333,1.66666666666667 -"perl-Data-Alias",0.1378605049,2.1486354011,-0.5977466385,"https://salsa.debian.org/perl-team/modules/packages/libdata-alias-perl","https://github.com/mvduin/perl-Data-Alias",610.4551041667,0,2,0,2,4,0,0,4,1,"1",2,2 -"Data-Dumper-Concise",0.2663762197,2.5519999595,-0.2144683206,"https://salsa.debian.org/perl-team/modules/packages/libdata-dumper-concise-perl","https://github.com/p5sagit/Data-Dumper-Concise",2778.0428240741,1,3,0,2,0,0,0,2,2,"2",1.75,1 -"Data-FormValidator",-0.452587545,1.1833831498,-0.804155609,"https://salsa.debian.org/perl-team/modules/packages/libdata-formvalidator-perl","https://github.com/dnmfarrell/Data-FormValidator.git",2189.7575578704,3,6,0,6,10,0,0,11,1,"1",1.66666666666667,1.90909090909091 -"data-hal",-0.7708587998,2.2387120212,-1.7298903065,"https://salsa.debian.org/perl-team/modules/packages/libdata-hal-perl","https://github.com/sipwise/data-hal.git",3620.8497222222,0,13,0,10,4,0,0,12,2,"2",2,1.33333333333333 -"Data-OptList",0.4752078978,2.7815727481,-0.0271116591,"https://salsa.debian.org/perl-team/modules/packages/libdata-optlist-perl","https://github.com/rjbs/Data-OptList.git",5253.3015972222,0,2,0,2,5,0,0,5,4,"4",2,2 -"data-phrasebook",-2.0173455185,0.5053918978,-2.598257896,"https://salsa.debian.org/perl-team/modules/packages/libdata-phrasebook-perl","https://github.com/barbie/data-phrasebook.git",3782.0208333333,0,1,0,1,0,0,0,1,3,"3",2,1 -"perl-database-dumptruck",-2.6354712016,-0.053291936,-3.2800311486,"https://salsa.debian.org/perl-team/modules/packages/libdatabase-dumptruck-perl","https://github.com/lkundrak/perl-database-dumptruck.git",85.8566550926,0,1,0,1,1,0,0,2,1,"1",2,1.5 -"DateTime-Format-Mail",0.3841471215,2.8615309864,-0.1765169258,"https://salsa.debian.org/perl-team/modules/packages/libdatetime-format-mail-perl","https://github.com/book/DateTime-Format-Mail.git",809.9546875,2,1,0,3,7,0,0,7,1,"1",1.33333333333333,2 -"DBD-ODBC",-0.4492586589,-0.3647039199,-0.4605696828,"https://salsa.debian.org/perl-team/modules/packages/libdbd-odbc-perl","https://github.com/perl5-dbi/DBD-ODBC.git",4357.0500347222,1,12,0,8,22,0,0,22,3,"3",1.92307692307692,2 -"DBD-SQLite2",-0.2242626457,0.8599429182,-0.4391897101,"https://salsa.debian.org/perl-team/modules/packages/libdbd-sqlite2-perl","https://github.com/rurban/DBD-SQLite2",1683.3107175926,3,5,0,1,0,0,0,1,1,"1",1.625,1 -"DBIx-Abstract",-0.7663996691,0.9860020058,-1.2168119968,"https://salsa.debian.org/perl-team/modules/packages/libdbix-abstract-perl","https://github.com/iarna/DBIx-Abstract.git",3028.2298842593,1,6,0,3,3,0,0,3,2,"2",1.85714285714286,2 -"dbix-class-schema-loader",0.899902187,3.2743262714,-0.0171547791,"https://salsa.debian.org/perl-team/modules/packages/libdbix-class-schema-loader-perl","https://github.com/dbsrgits/dbix-class-schema-loader",5369.7104282407,13,29,0,32,33,0,0,52,4,"4",1.69047619047619,1.63461538461538 -"Debian-Copyright",0.0036003397,1.9825965853,-0.5566012214,"https://salsa.debian.org/perl-team/modules/packages/libdebian-copyright-perl","https://github.com/periapt/Debian-Copyright.git",467.6439236111,0,1,0,1,1,0,0,2,1,"1",2,1.5 -"Devel-bt",-0.5926888766,2.1164194627,-1.6374000091,"https://salsa.debian.org/perl-team/modules/packages/libdevel-bt-perl","http://github.com/rafl/Devel-bt",563.5733796296,0,1,0,0,0,0,0,0,1,"1",2,NA -"Devel-Cycle",0.2975717055,2.3628676137,-0.1689937232,"https://salsa.debian.org/perl-team/modules/packages/libdevel-cycle-perl","https://github.com/lstein/Devel-Cycle.git",24.4394791667,1,2,0,1,0,0,0,1,1,"1",1.66666666666667,1 -"devel-symdump",0.1995761912,1.3405631393,-0.0953876401,"https://salsa.debian.org/debian/libdevel-symdump-perl","https://github.com/andk/devel-symdump",2899.582337963,0,6,0,4,4,0,0,5,2,"2",2,1.8 -"Perl-Device-Cdio",-1.3704489286,-0.772668166,-1.5698638654,"https://salsa.debian.org/perl-team/modules/packages/libdevice-cdio-perl","https://github.com/rocky/Perl-Device-Cdio.git",3711.3743287037,0,4,0,1,6,0,0,6,2,"2",2,2 -"directory-scratch",-0.3578234126,3.2936545083,-1.4107895462,"https://salsa.debian.org/perl-team/modules/packages/libdirectory-scratch-perl","https://github.com/bobtfish/directory-scratch.git",1951.3868981482,1,5,0,4,1,0,0,4,1,"1",1.83333333333333,1.25 -"p5-dist-inkt",-1.6527902396,0.7910520727,-2.1410543937,"https://salsa.debian.org/perl-team/modules/packages/libdist-inkt-perl","https://github.com/tobyink/p5-dist-inkt",2915.0334953704,0,1,0,1,4,0,0,4,2,"2",2,2 -"p5-dist-inkt-role-test",-1.5942005273,1.6783425318,-2.409860989,"https://salsa.debian.org/perl-team/modules/packages/libdist-inkt-role-test-perl","https://github.com/tobyink/p5-dist-inkt-role-test",0.0739467593,0,1,0,1,0,0,0,1,1,"1",2,1 -"dist-zilla-plugins-cjm",-0.7135120934,1.9137851349,-1.4906069541,"https://salsa.debian.org/perl-team/modules/packages/libdist-zilla-plugins-cjm-perl","https://github.com/madsen/dist-zilla-plugins-cjm",3005.9145833333,0,4,0,4,10,0,0,11,2,"2",2,1.90909090909091 -"libdivsufsort",0.3802819676,3.1639307168,-0.2503528943,"https://salsa.debian.org/med-team/libdivsufsort","https://github.com/y-256/libdivsufsort.git",2687.7754050926,0,6,0,2,28,0,0,28,1,"1",2,2 -"libdogleg",-0.2667101184,1.7245498351,-0.6711419661,"https://salsa.debian.org/science-team/libdogleg","https://github.com/dkogan/libdogleg.git",4490.860775463,0,5,0,2,1,0,0,2,3,"3",2,1.5 -"libeatmydata",0.3763000817,1.1375608394,0.0117248362,"https://salsa.debian.org/debian/libeatmydata","https://github.com/stewartsmith/libeatmydata.git",5640.2884027778,11,12,0,16,27,0,0,35,4,"4",1.52173913043478,1.77142857142857 -"Email-MIME-CreateHTML",-0.598597254,0.9396464518,-0.9866469243,"https://salsa.debian.org/perl-team/modules/packages/libemail-mime-createhtml-perl","https://github.com/vanstyn/Email-MIME-CreateHTML.git",1257.2075810185,1,3,0,3,9,0,0,10,1,"1",1.75,1.9 -"end",-1.6952231001,0.2859980609,-2.1369126329,"https://salsa.debian.org/perl-team/modules/packages/libend-perl","https://github.com/Abigail/end.git",519.9620023148,0,1,0,0,1,0,0,1,1,"1",2,2 -"libeot",0.4231617787,2.6750549846,-0.0161024184,"https://salsa.debian.org/fonts-team/libeot","https://github.com/umanwizard/libeot.git",3660.8458101852,1,5,0,4,6,0,0,9,2,"2",1.83333333333333,1.66666666666667 -"eval-closure",0.3725931069,2.6025825306,-0.0711445029,"https://salsa.debian.org/perl-team/modules/packages/libeval-closure-perl","https://github.com/doy/eval-closure.git",2047.9688310185,1,4,0,5,11,0,0,13,1,"1",1.8,1.84615384615385 -"libevt",0.3231580646,2.9388038619,-0.3464543518,"https://salsa.debian.org/pkg-security-team/libevt","https://github.com/libyal/libevt",2794.588125,1,2,0,2,3,0,2,5,2,"2",1.66666666666667,1.6 -"libevtx",0.4679040206,3.3941203575,-0.3128196542,"https://salsa.debian.org/pkg-security-team/libevtx","https://github.com/libyal/libevtx",2794.5568055556,0,1,0,1,24,0,2,26,2,"2",2,1.92307692307692 -"libeXaDrums",-1.57576575,0.4655834923,-2.0471585802,"https://github.com/SpintroniK/libeXaDrums/tree/debian","https://github.com/SpintroniK/libeXaDrums",2888.0486342593,2,6,0,3,6,0,0,7,2,"2",1.75,1.85714285714286 -"libexif-gtk",0.6899028208,2.4094585548,0.0374998074,"https://salsa.debian.org/debian-phototools-team/libexif-gtk","https://github.com/libexif/libexif-gtk.git",5131.8707407407,2,5,0,6,4,0,0,6,4,"4",1.71428571428571,1.66666666666667 -"ExtUtils-CBuilder",-0.5036465134,1.0344999475,-0.9863787578,"https://salsa.debian.org/perl-team/modules/packages/libextutils-cbuilder-perl","https://github.com/Perl-Toolchain-Gang/ExtUtils-CBuilder.git",4657.3346759259,8,12,0,11,12,0,0,17,3,"3",1.6,1.70588235294118 -"extutils-modulemaker",-1.6287177053,0.4949751478,-2.0632435211,"https://salsa.debian.org/perl-team/modules/packages/libextutils-modulemaker-perl","https://github.com/jkeenan/extutils-modulemaker.git",3844.1565972222,0,2,0,1,4,0,0,4,3,"3",2,2 -"libfcgi-debian",2.4025790949,4.8601691677,1.2415729675,"https://github.com/tehnick/libfcgi-debian","https://github.com/tehnick/libfcgi-debian",1176.1604513889,0,1,0,1,1,0,0,2,1,"1",2,1.5 -"File-MimeInfo",1.3146582473,3.1446233838,0.4775906292,"https://salsa.debian.org/perl-team/modules/packages/libfile-mimeinfo-perl","https://github.com/mbeijen/File-MimeInfo.git",3834.7099189815,10,12,0,18,50,0,0,53,3,"3",1.54545454545455,1.94339622641509 -"File-Modified",-0.1454311962,1.4011585761,-0.5041124489,"https://salsa.debian.org/perl-team/modules/packages/libfile-modified-perl","https://github.com/neilb/File-Modified",2145.0378472222,1,2,0,1,0,0,0,1,1,"1",1.66666666666667,1 -"file-save-home",-1.8007818428,0.3604487668,-2.2376298003,"https://salsa.debian.org/perl-team/modules/packages/libfile-save-home-perl","https://github.com/jkeenan/file-save-home",1776.9554861111,0,2,0,1,0,0,0,1,1,"1",2,1 -"File-Touch",0.098284703,1.8336262821,-0.2560959194,"https://salsa.debian.org/perl-team/modules/packages/libfile-touch-perl","https://github.com/neilb/File-Touch",4116.4970486111,1,3,0,2,3,0,0,3,3,"3",1.75,2 -"perl-File-Write-Rotate",-1.0296556573,1.3459084629,-1.5005566671,"https://salsa.debian.org/perl-team/modules/packages/libfile-write-rotate-perl","https://github.com/sharyanto/perl-File-Write-Rotate.git",3146.8113888889,0,17,0,5,6,0,0,7,2,"2",2,1.85714285714286 -"filehandle-unget",0.0063823885,1.5940372704,-0.2756601201,"https://salsa.debian.org/perl-team/modules/packages/libfilehandle-unget-perl","https://github.com/coppit/filehandle-unget.git",3647.0964930556,0,3,0,1,0,0,0,1,2,"2",2,1 -"Filesys-Notify-Simple",0.1924577796,2.7235880131,-0.2464440556,"https://salsa.debian.org/perl-team/modules/packages/libfilesys-notify-simple-perl","https://github.com/miyagawa/Filesys-Notify-Simple.git",4730.4164814815,0,13,0,9,27,0,0,27,3,"3",2,2 -"Filter",-0.2555356397,0.0318054425,-0.3077435742,"https://salsa.debian.org/debian/libfilter-perl","https://github.com/rurban/Filter",4868.3054861111,5,12,0,11,13,0,0,14,3,"3",1.70588235294118,1.92857142857143 -"filter-template",-1.0581574357,1.1903314595,-1.5773248661,"https://salsa.debian.org/perl-team/modules/packages/libfilter-template-perl","https://github.com/rcaputo/filter-template",1475.5620138889,0,1,0,1,0,0,0,1,1,"1",2,1 -"libfixposix",-0.4206114577,2.0891396228,-0.9806467917,"https://salsa.debian.org/common-lisp-team/libfixposix","https://github.com/sionescu/libfixposix.git",4611.074537037,9,4,0,10,24,0,0,28,3,"3",1.30769230769231,1.85714285714286 -"libfizmo",0.6273284521,4.5692102059,-0.4878285416,"https://github.com/chrender/libfizmo","https://github.com/chrender/libfizmo",4850.5273958333,1,7,0,3,3,0,0,3,3,"3",1.875,2 -"libfsntfs",0.3317907898,2.8232850998,-0.2751892076,"https://salsa.debian.org/pkg-security-team/libfsntfs","https://github.com/libyal/libfsntfs.git",3331.7044212963,0,1,0,1,16,0,2,18,2,"2",2,1.88888888888889 -"libfte",-1.9268255727,0.4828975174,-2.5557399688,"https://github.com/kpdyer/libfte/tree/debian/unstable","https://github.com/kpdyer/libfte",519.2035763889,0,6,1,3,6,0,0,6,1,"1",2,2 -"libfvde",0.9569035002,4.5103410226,-0.1365413277,"https://salsa.debian.org/pkg-security-team/libfvde","https://github.com/libyal/libfvde.git",3327.7584953704,0,1,0,1,79,0,2,81,2,"2",2,1.97530864197531 -"libfwnt",0.4678493195,3.4503175442,-0.3155910203,"https://salsa.debian.org/pkg-security-team/libfwnt","https://github.com/libyal/libfwnt",3707.8170833333,2,1,0,3,9,0,2,11,2,"2",1.33333333333333,1.81818181818182 -"libfwsi",0.4767451355,3.2824611568,-0.3244519074,"https://salsa.debian.org/pkg-security-team/libfwsi","https://github.com/libyal/libfwsi.git",3356.5179398148,0,1,0,1,19,0,2,21,2,"2",2,1.9047619047619 -"gclib",-1.2540063751,1.2393506434,-1.793979304,"https://salsa.debian.org/med-team/libgclib","https://github.com/gpertea/gclib",2782.2130555556,2,2,0,3,11,0,0,11,2,"2",1.5,2 -"gdal-grass",0.1785470496,2.1229290789,-0.4698383341,"https://salsa.debian.org/debian-gis-team/gdal-grass","https://github.com/OSGeo/gdal-grass.git",695.4440625,6,4,0,13,3,0,0,13,1,"1",1.4,1.23076923076923 -"geo-google-mapobject",-0.8736364381,1.4566987694,-1.3139869808,"https://salsa.debian.org/perl-team/modules/packages/libgeo-google-mapobject-perl","https://github.com/periapt/geo-google-mapobject.git",50.641099537,0,1,0,1,1,0,0,2,1,"1",2,1.5 -"geoip-api-perl",-0.1336111961,0.5223083889,-0.2976960926,"https://salsa.debian.org/perl-team/modules/packages/libgeo-ip-perl","https://github.com/maxmind/geoip-api-perl.git",4739.8765162037,5,12,0,10,18,0,0,22,3,"3",1.70588235294118,1.81818181818182 -"git-pureperl",-0.9270531395,0.744963627,-1.3901965303,"https://salsa.debian.org/perl-team/modules/packages/libgit-pureperl-perl","https://github.com/broquaint/git-pureperl.git",2866.3317824074,3,22,0,14,6,0,0,15,2,"2",1.88,1.4 -"libgit2",0.7426843467,1.4899627881,0.3118438265,"https://salsa.debian.org/debian/libgit2","https://github.com/libgit2/libgit2.git",5520.8953703704,104,508,0,399,0,0,0,399,4,"4",1.83006535947712,1 -"gnupg-interface",0.1615830389,0.739184756,-0.1104590476,"https://salsa.debian.org/perl-team/modules/packages/libgnupg-interface-perl","https://github.com/bestpractical/gnupg-interface.git",5505.2035300926,4,10,0,13,15,0,0,22,4,"4",1.71428571428571,1.68181818181818 -"Graph-D3",-2.0103879366,0.5815176639,-2.5923181246,"https://salsa.debian.org/perl-team/modules/packages/libgraph-d3-perl","https://github.com/shoheik/Graph-D3.git",1331.9675925926,1,3,0,3,3,0,0,4,1,"1",1.75,1.75 -"Graph-ReadWrite",0.0013928296,2.5958738365,-0.7361535942,"https://salsa.debian.org/perl-team/modules/packages/libgraph-readwrite-perl","https://github.com/neilb/Graph-ReadWrite.git",2428.8532986111,0,5,0,3,3,0,0,3,1,"1",2,2 -"p5-graph-writer-dsm",-2.8359680573,-0.7007526287,-3.3075782595,"https://salsa.debian.org/perl-team/modules/packages/libgraph-writer-dsm-perl","https://github.com/joenio/p5-graph-writer-dsm.git",1743.0827777778,0,2,0,1,0,0,0,1,1,"1",2,1 -"Graphics-ColorNames-WWW",-0.8846098514,1.1184900901,-1.3674713039,"https://salsa.debian.org/perl-team/modules/packages/libgraphics-colornames-www-perl","https://github.com/cfaerber/Graphics-ColorNames-WWW",3881.2659606482,0,3,0,1,0,0,0,1,3,"3",2,1 -"GraphViz",-0.0292832904,0.8748911062,-0.2131770807,"https://salsa.debian.org/perl-team/modules/packages/libgraphviz-perl","https://github.com/ronsavage/GraphViz.git",4149.5647685185,0,8,0,6,5,0,0,6,3,"3",2,1.83333333333333 -"libgtextutils",0.1810799898,2.3142226538,-0.6333026117,"https://salsa.debian.org/med-team/libgtextutils","https://github.com/agordon/libgtextutils.git",1379.9043171296,1,2,0,1,21,0,0,21,1,"1",1.66666666666667,2 -"gzstream",-0.4604271748,1.0639003315,-0.7280422963,"https://salsa.debian.org/med-team/libgzstream","https://github.com/kanedo/gzstream.git",1271.8150115741,0,2,0,1,4,0,0,4,1,"1",2,2 -"perl-html-stripscripts",-0.3606801075,1.7950802024,-0.7870879637,"https://salsa.debian.org/perl-team/modules/packages/libhtml-stripscripts-perl","https://github.com/clintongormley/perl-html-stripscripts.git",634.9694444444,1,1,0,2,4,0,0,4,1,"1",1.5,2 -"html-template",0.2623998312,1.2787610043,-0.0168521747,"https://salsa.debian.org/perl-team/modules/packages/libhtml-template-perl","https://github.com/mpeters/html-template.git",2360.5546296296,1,10,0,6,17,0,0,17,1,"1",1.90909090909091,2 -"HTML-Tiny",-0.2742049645,2.1158495273,-0.8034234216,"https://salsa.debian.org/perl-team/modules/packages/libhtml-tiny-perl","https://github.com/ap/HTML-Tiny.git",5143.9249537037,0,2,0,2,0,0,0,2,4,"4",2,1 -"HTTP-Message",1.2240574234,4.0822720732,0.2771667606,"https://salsa.debian.org/perl-team/modules/packages/libhttp-message-perl","https://github.com/libwww-perl/HTTP-Message.git",5655.1268518519,76,18,0,56,26,0,1,74,4,"4",1.19148936170213,1.35135135135135 -"HTTP-Proxy",-0.0949217121,1.2455203169,-0.6350123924,"https://salsa.debian.org/perl-team/modules/packages/libhttp-proxy-perl","https://github.com/book/HTTP-Proxy.git",4041.0415393519,7,1,0,8,15,0,0,18,3,"3",1.125,1.83333333333333 -"http-server-simple",0.8231195226,2.8527464993,0.0853932498,"https://salsa.debian.org/perl-team/modules/packages/libhttp-server-simple-perl","https://github.com/bestpractical/http-server-simple",2910.7674074074,4,11,0,11,4,0,0,12,2,"2",1.73333333333333,1.33333333333333 -"HTTP-Server-Simple-PSGI",-0.1977126095,1.9180365026,-0.6285309261,"https://salsa.debian.org/perl-team/modules/packages/libhttp-server-simple-psgi-perl","https://github.com/miyagawa/HTTP-Server-Simple-PSGI.git",1409.5210763889,0,2,0,2,3,0,0,4,1,"1",2,1.75 -"libhugetlbfs",-0.6583887261,1.4081810608,-1.179127099,"https://github.com/punitagrawal/libhugetlbfs.git","https://github.com/punitagrawal/libhugetlbfs.git",2039.1172800926,1,1,0,2,1,0,0,3,1,"1",1.5,1.33333333333333 -"libics",-1.5487571477,-0.7977160114,-1.7237343016,"https://salsa.debian.org/med-team/libics","https://github.com/svi-opensource/libics",4511.1015277778,4,15,0,9,13,0,0,14,3,"3",1.78947368421053,1.92857142857143 -"Net-IDN-Encode",0.0249334359,3.9722760412,-1.0659289095,"https://salsa.debian.org/perl-team/modules/packages/libidna-punycode-perl","https://github.com/cfaerber/Net-IDN-Encode.git",3674.6395949074,6,7,0,3,12,0,0,12,2,"2",1.53846153846154,2 -"iksemel",1.4056706717,3.3010035011,0.531380273,"https://salsa.debian.org/debian/libiksemel","https://github.com/meduketto/iksemel",2285.3264351852,0,3,0,0,15,0,0,15,1,"1",2,2 -"p5-image-exif",-0.3566210754,0.8027615419,-0.610345557,"https://salsa.debian.org/perl-team/modules/packages/libimage-exif-perl","https://github.com/arc/p5-image-exif.git",101.2955787037,2,2,0,1,1,0,0,2,1,"1",1.5,1.5 -"Image-MetaData-JPEG",0.1782474931,2.8015789571,-0.5717239967,"https://salsa.debian.org/perl-team/modules/packages/libimage-metadata-jpeg-perl","https://github.com/rjbs/Image-MetaData-JPEG.git",1915.8586921296,1,3,0,2,0,0,0,2,1,"1",1.75,1 -"image-size",0.2728915097,1.5941936935,-0.1459963248,"https://salsa.debian.org/perl-team/modules/packages/libimage-size-perl","https://github.com/rjray/image-size.git",4527.5378587963,0,12,0,10,14,0,0,14,3,"3",2,2 -"libinstpatch",0.3063715043,2.068273106,-0.0894533028,"https://salsa.debian.org/multimedia-team/libinstpatch","https://github.com/swami/libinstpatch",4470.7645833333,4,11,0,8,17,0,0,19,3,"3",1.73333333333333,1.89473684210526 -"p5-io-callback",-2.0212295476,0.6694774365,-2.7211969358,"https://salsa.debian.org/perl-team/modules/packages/libio-callback-perl","https://github.com/tobyink/p5-io-callback.git",2909.5988078704,0,1,0,1,0,0,0,1,2,"2",2,1 -"IO-Digest",-0.1769998583,2.4353442239,-0.8553329296,"https://salsa.debian.org/perl-team/modules/packages/libio-digest-perl","https://github.com/clkao/IO-Digest.git",1863.0997106482,1,4,0,3,4,0,0,4,1,"1",1.8,2 -"File-Flock",0.2170241797,2.8246432586,-0.6360167425,"https://salsa.debian.org/perl-team/modules/packages/libio-event-perl","https://github.com/muir/File-Flock.git",474.8396990741,0,4,0,4,6,0,0,6,1,"1",2,2 -"LibIO-Interface-Perl",1.0184295465,4.1476474847,0.0508969184,"https://salsa.debian.org/perl-team/modules/packages/libio-interface-perl","https://github.com/lstein/LibIO-Interface-Perl.git",2278.4801041667,0,2,0,1,6,0,0,7,1,"1",2,1.85714285714286 -"perl-io-socket-inet6",1.0536105818,2.554159089,0.3603685147,"https://salsa.debian.org/perl-team/modules/packages/libio-socket-inet6-perl","https://github.com/shlomif/perl-io-socket-inet6.git",5052.8307060185,0,3,0,1,0,0,0,1,4,"4",2,1 -"IPC-Run3",0.5630723174,3.202492468,-0.0863000736,"https://salsa.debian.org/perl-team/modules/packages/libipc-run3-perl","https://github.com/rjbs/IPC-Run3.git",1899.0353819445,8,2,0,10,19,0,0,20,1,"1",1.2,1.95 -"ipc-system-simple",0.7025068064,3.3730782331,0.0378027178,"https://salsa.debian.org/perl-team/modules/packages/libipc-system-simple-perl","https://github.com/pjf/ipc-system-simple.git",5306.4576388889,4,11,0,8,42,0,0,42,4,"4",1.73333333333333,2 -"ITL",0.0254308757,1.554670546,-0.4274590481,"https://salsa.debian.org/islamic-team/libitl","https://github.com/arabeyes-org/ITL",3251.4730902778,2,13,0,6,19,0,0,19,2,"2",1.86666666666667,2 -"libitl-gobject",-0.7439913292,1.4835301757,-1.3690898031,"https://salsa.debian.org/islamic-team/libitl-gobject","https://github.com/aelmahmoudy/libitl-gobject.git",2211.2291898148,0,2,0,1,0,0,0,1,1,"1",2,1 -"jbzip2",-0.1117625553,1.7645153992,-0.5532046545,"https://salsa.debian.org/java-team/libjbzip2-java","https://github.com/routeKIT/jbzip2.git",1394.2040046296,0,2,0,1,0,0,0,1,1,"1",2,1 -"libjcat",-2.9665296188,-1.1386554909,-3.3229751102,"https://salsa.debian.org/efi-team/libjcat","https://github.com/hughsie/libjcat.git",1373.0888425926,7,5,0,7,13,0,0,14,1,"1",1.41666666666667,1.92857142857143 -"jifty-dbi",-1.6146679558,0.7852306876,-2.2707603438,"https://salsa.debian.org/perl-team/modules/packages/libjifty-dbi-perl","https://github.com/bestpractical/jifty-dbi.git",2518.1463888889,1,16,0,21,6,0,0,25,1,"1",1.94117647058824,1.24 -"Lingua-EN-Inflect-Number",0.1280326899,2.5007020448,-0.4017863004,"https://salsa.debian.org/perl-team/modules/packages/liblingua-en-inflect-number-perl","https://github.com/neilbowers/Lingua-EN-Inflect-Number",2030.0671527778,1,2,0,1,0,0,0,1,1,"1",1.66666666666667,1 -"Lingua-EN-Numbers-Ordinate",-0.5287396988,1.7136767904,-0.9568574903,"https://salsa.debian.org/perl-team/modules/packages/liblingua-en-numbers-ordinate-perl","https://github.com/neilb/Lingua-EN-Numbers-Ordinate",4119.2290856482,1,2,0,1,0,0,0,1,3,"3",1.66666666666667,1 -"Lingua-PT-Stemmer",-0.0370378021,1.7556059977,-0.4052943013,"https://salsa.debian.org/perl-team/modules/packages/liblingua-pt-stemmer-perl","https://github.com/neilb/Lingua-PT-Stemmer.git",472.7143518519,1,2,0,1,0,0,0,1,1,"1",1.66666666666667,1 -"list-compare",0.3913134488,2.6930680807,-0.0910990527,"https://salsa.debian.org/perl-team/modules/packages/liblist-compare-perl","https://github.com/jkeenan/list-compare.git",5186.5518171296,4,4,0,6,7,0,0,7,4,"4",1.5,2 -"Locale-Maketext-Gettext",-0.4988694756,1.1302337571,-0.8279808959,"https://salsa.debian.org/perl-team/modules/packages/liblocale-maketext-gettext-perl","https://github.com/imacat/Locale-Maketext-Gettext.git",519.6569444444,0,2,0,1,0,0,0,1,1,"1",2,1 -"locale-maketext-lexicon",0.161275632,1.8969602532,-0.2840997851,"https://salsa.debian.org/perl-team/modules/packages/liblocale-maketext-lexicon-perl","https://github.com/clintongormley/locale-maketext-lexicon.git",1951.7074074074,1,9,0,7,17,0,0,17,1,"1",1.9,2 -"p5-Locales",-1.0439124558,1.1408551718,-1.4785456456,"https://salsa.debian.org/perl-team/modules/packages/liblocales-perl","https://github.com/drmuey/p5-Locales.git",1740.6568287037,0,3,0,2,4,0,0,4,1,"1",2,2 -"liblockfile-debian",1.3452804851,2.1620317868,0.8349604945,"https://github.com/miquels/liblockfile-debian","https://github.com/miquels/liblockfile-debian",1484.1868055556,0,2,0,1,0,0,0,1,1,"1",2,1 -"log-message-simple",0.207617298,1.6631748554,-0.0635138373,"https://salsa.debian.org/perl-team/modules/packages/liblog-message-simple-perl","https://github.com/jib/log-message-simple.git",1230.0807175926,0,3,0,2,1,0,0,2,1,"1",2,1.5 -"libltc",0.2546232027,2.4814619881,-0.1954510519,"https://salsa.debian.org/multimedia-team/libltc","https://github.com/x42/libltc",3674.4912152778,2,8,0,6,48,0,0,50,2,"2",1.8,1.96 -"p5-lwp-useragent-chicaching",-0.7942219141,1.5178916477,-1.2272281043,"https://salsa.debian.org/perl-team/modules/packages/liblwp-useragent-chicaching-perl","https://github.com/kjetilk/p5-lwp-useragent-chicaching.git",1283.7690740741,0,1,0,1,3,0,0,3,1,"1",2,2 -"magpie",-1.7158635114,1.197884825,-2.5208982983,"https://salsa.debian.org/perl-team/modules/packages/libmagpie-perl","https://github.com/tamarou/magpie.git",2275.6417824074,0,6,0,5,5,0,3,9,1,"1",2,1.55555555555556 -"mail-mbox-messageparser",-0.0992180029,0.3833084593,-0.2549281336,"https://salsa.debian.org/perl-team/modules/packages/libmail-mbox-messageparser-perl","https://github.com/coppit/mail-mbox-messageparser.git",3258.3029513889,0,3,0,1,0,0,0,1,2,"2",2,1 -"perl5-MailTools",1.0529685668,2.1520713579,0.4690208845,"https://salsa.debian.org/perl-team/modules/packages/libmailtools-perl","https://github.com/markov2/perl5-MailTools",1648.7267013889,0,2,0,1,4,0,0,4,1,"1",2,2 -"libmatemixer",0.5190776518,2.8714266987,-0.0439618764,"https://salsa.debian.org/debian-mate-team/libmatemixer","https://github.com/mate-desktop/libmatemixer.git",3404.5255092593,7,20,0,15,31,0,0,35,2,"2",1.74074074074074,1.88571428571429 -"perl-math-basecalc",-1.0492971392,0.7762474864,-1.6069135742,"https://salsa.debian.org/perl-team/modules/packages/libmath-basecalc-perl","https://github.com/kenahoo/perl-math-basecalc.git",3269.0290740741,0,8,0,2,5,0,0,5,2,"2",2,2 -"Math-GMP",-0.4977700318,1.2717897116,-0.9791927568,"https://salsa.debian.org/perl-team/modules/packages/libmath-gmp-perl","https://github.com/turnstep/Math-GMP.git",2969.082974537,1,6,0,5,6,0,0,6,2,"2",1.85714285714286,2 -"Math-Random-ISAAC",0.6477137679,3.3609472371,-0.0377506361,"https://salsa.debian.org/perl-team/modules/packages/libmath-random-isaac-perl","https://github.com/jawnsy/Math-Random-ISAAC",2416.3080324074,0,1,0,1,1,0,0,1,1,"1",2,2 -"Math-Random-ISAAC-XS",0.4200441154,2.426176795,-0.0688144675,"https://salsa.debian.org/perl-team/modules/packages/libmath-random-isaac-xs-perl","https://github.com/jawnsy/Math-Random-ISAAC-XS.git",2412.8853703704,0,1,0,1,0,0,0,1,1,"1",2,1 -"math-random-oo",-1.3518748941,0.9987771421,-1.8072166016,"https://salsa.debian.org/perl-team/modules/packages/libmath-random-oo-perl","https://github.com/dagolden/math-random-oo.git",1499.3150694445,0,1,0,1,2,0,0,3,1,"1",2,1.66666666666667 -"mce-perl",-0.2406488454,2.0794415417,-0.6733224842,"https://salsa.debian.org/perl-team/modules/packages/libmce-perl","https://github.com/marioroy/mce-perl.git",2944.7772337963,1,6,0,6,17,0,0,17,2,"2",1.85714285714286,2 -"Memoize-ExpireLRU",0.1936518014,2.9309817533,-0.4019145174,"https://salsa.debian.org/perl-team/modules/packages/libmemoize-expirelru-perl","https://github.com/neilb/Memoize-ExpireLRU",624.640474537,1,2,0,1,0,0,0,1,1,"1",1.66666666666667,1 -"Message-Passing",-1.5721707445,-0.5831799889,-1.7635460333,"https://salsa.debian.org/perl-team/modules/packages/libmessage-passing-perl","https://github.com/suretec/Message-Passing.git",2987.7789236111,1,15,0,11,14,0,0,16,2,"2",1.9375,1.875 -"method-signatures-simple",-0.5051718146,2.287989514,-1.1367149384,"https://salsa.debian.org/perl-team/modules/packages/libmethod-signatures-simple-perl","https://github.com/rhesa/method-signatures-simple.git",4262.9309953704,0,6,0,2,4,0,0,4,3,"3",2,2 -"minIni",-0.452730067,0.8302579746,-0.745676424,"https://salsa.debian.org/yangfl-guest/minIni","https://github.com/compuphase/minIni",2280.3336342593,2,6,0,4,22,0,0,22,1,"1",1.75,2 -"MLDBM",0.2556850889,2.2171328226,-0.1413700534,"https://salsa.debian.org/perl-team/modules/packages/libmldbm-perl","https://github.com/chorny/MLDBM.git",1906.0319791667,3,2,0,2,0,0,0,2,1,"1",1.4,1 -"Module-CPANTS-Analyse",0.6092458087,3.4788905255,-0.4688881027,"https://salsa.debian.org/perl-team/modules/packages/libmodule-cpants-analyse-perl","https://github.com/cpants/Module-CPANTS-Analyse.git",5647.7312152778,8,20,0,23,21,0,0,33,4,"4",1.71428571428571,1.63636363636364 -"module-extract-use",-1.4214887251,0.7223462254,-1.8616614077,"https://salsa.debian.org/perl-team/modules/packages/libmodule-extract-use-perl","https://github.com/briandfoy/module-extract-use.git",2918.7995717593,0,7,0,4,8,0,0,8,2,"2",2,2 -"Module-Find",0.5306890725,2.9619110746,-0.0631954531,"https://salsa.debian.org/perl-team/modules/packages/libmodule-find-perl","https://github.com/crenz/Module-Find.git",4710.686875,2,8,0,7,14,0,0,15,3,"3",1.8,1.93333333333333 -"module-install-readmefrompod",-1.8312131642,-0.8033082466,-2.0615814708,"https://salsa.debian.org/perl-team/modules/packages/libmodule-install-readmefrompod-perl","https://github.com/bingos/module-install-readmefrompod.git",2847.0250694445,0,7,0,6,4,0,0,6,2,"2",2,1.66666666666667 -"Perl-Module-Install-XSUtil",-1.9528681484,-0.4161990227,-2.2440219121,"https://salsa.debian.org/perl-team/modules/packages/libmodule-install-xsutil-perl","https://github.com/gfx/Perl-Module-Install-XSUtil.git",1649.8556828704,0,9,0,3,4,0,0,6,1,"1",2,1.66666666666667 -"Module-Manifest",-0.2750809802,2.0412664766,-0.7072069311,"https://salsa.debian.org/perl-team/modules/packages/libmodule-manifest-perl","https://github.com/karenetheridge/Module-Manifest",3547.1878935185,0,3,0,3,0,0,0,3,2,"2",2,1 -"module-manifest-skip-pm",-0.3311047045,2.0896483213,-0.8611240864,"https://salsa.debian.org/perl-team/modules/packages/libmodule-manifest-skip-perl","https://github.com/ingydotnet/module-manifest-skip-pm.git",1169.1213194445,0,5,0,3,11,0,0,11,1,"1",2,2 -"p5-module-package-rdf",-1.9996964425,0.8089579857,-2.7247782661,"https://salsa.debian.org/perl-team/modules/packages/libmodule-package-rdf-perl","https://github.com/tobyink/p5-module-package-rdf",668.6822106481,0,1,0,1,0,0,0,1,1,"1",2,1 -"module-signature",0.6153933477,2.3081438868,0.0588548985,"https://salsa.debian.org/perl-team/modules/packages/libmodule-signature-perl","https://github.com/audreyt/module-signature.git",4414.5291782407,0,17,0,11,23,0,0,23,3,"3",2,2 -"Module-Starter-Plugin-CGIApp",-1.0772217685,1.7774421629,-2.0362185062,"https://github.com/jaldhar/Module-Starter-Plugin-CGIApp","https://github.com/jaldhar/Module-Starter-Plugin-CGIApp",4024.0661921296,0,7,0,4,4,0,0,4,3,"3",2,2 -"p5-moops",-2.0160241228,0.1848579356,-2.5747690554,"https://salsa.debian.org/perl-team/modules/packages/libmoops-perl","https://github.com/tobyink/p5-moops",2419.9678819445,0,3,0,2,7,0,0,7,1,"1",2,2 -"p5-moosex-attributetags",-1.484446991,0.7122802252,-1.9169457017,"https://salsa.debian.org/perl-team/modules/packages/libmoosex-attributetags-perl","https://github.com/tobyink/p5-moosex-attributetags",2042.2449074074,0,1,0,1,4,0,0,4,1,"1",2,2 -"perl-mp3-info",0.9722005224,3.0635904685,0.1459746264,"https://salsa.debian.org/perl-team/modules/packages/libmp3-info-perl","https://github.com/JJ/perl-mp3-info.git",3267.4327777778,1,4,0,1,3,0,0,3,2,"2",1.8,2 -"libmsiecf",0.4655231291,3.4302212781,-0.3202002984,"https://salsa.debian.org/pkg-security-team/libmsiecf","https://github.com/libyal/libmsiecf.git",3548.1866898148,0,1,0,1,5,0,2,7,2,"2",2,1.71428571428571 -"multidimensional",0.6378488709,3.4059130057,-0.1088057954,"https://salsa.debian.org/perl-team/modules/packages/libmultidimensional-perl","https://github.com/ilmari/multidimensional",4293.3777314815,1,3,0,4,4,0,0,6,3,"3",1.75,1.66666666666667 -"libmurmurhash",-1.1606750215,1.2419656851,-1.5922212752,"https://salsa.debian.org/med-team/libmurmurhash","https://github.com/kloetzl/libmurmurhash.git",1568.0675578704,0,1,0,1,0,0,0,1,1,"1",2,1 -"perl-nagios-object",-0.0287280626,2.4165825039,-0.5145037556,"https://salsa.debian.org/perl-team/modules/packages/libnagios-object-perl","https://github.com/duncs/perl-nagios-object.git",4719.3367939815,1,14,0,9,10,0,0,11,3,"3",1.93333333333333,1.90909090909091 -"libnatpmp",0.2543409022,1.1083518392,4.5219738185424e-05,"https://salsa.debian.org/miniupnp-team/libnatpmp","https://github.com/miniupnp/libnatpmp",3832.0982523148,3,20,0,19,24,0,0,26,3,"3",1.8695652173913,1.92307692307692 -"libnbcompat",-5.0470695639,-2.6158016281,-5.4799549879,"https://github.com/jgoerzen/libnbcompat","https://github.com/jgoerzen/libnbcompat",3888.0046759259,0,19,0,0,2,0,0,2,3,"3",2,2 -"libndp",0.413875636,2.2608821975,0.0018314313,"https://salsa.debian.org/debian/libndp","https://github.com/jpirko/libndp.git",3924.0402314815,9,4,0,9,18,0,0,20,3,"3",1.30769230769231,1.9 -"libneo4j-client",-0.4420044551,1.822604323,-1.1962509735,"https://github.com/cleishm/libneo4j-client","https://github.com/cleishm/libneo4j-client",1826.3064351852,2,5,0,3,62,0,1,63,1,"1",1.71428571428571,1.98412698412698 -"p5-Net-DNS-Lite",-0.3886008757,1.7387555976,-0.810307745,"https://salsa.debian.org/perl-team/modules/packages/libnet-dns-lite-perl","https://github.com/kazuho/p5-Net-DNS-Lite.git",2215.0713888889,0,7,0,6,9,0,0,9,1,"1",2,2 -"Net-IDN-Encode",0.2021202967,2.48699816,-0.240749263,"https://salsa.debian.org/perl-team/modules/packages/libnet-idn-encode-perl","https://github.com/cfaerber/Net-IDN-Encode.git",3674.6395949074,6,7,0,3,12,0,0,12,2,"2",1.53846153846154,2 -"perl-net-jabber-bot",-1.4064709925,2.213836255,-2.339836966,"https://salsa.debian.org/perl-team/modules/packages/libnet-jabber-bot-perl","https://github.com/toddr/perl-net-jabber-bot.git",4656.9431712963,0,12,0,5,11,0,1,12,3,"3",2,1.91666666666667 -"Net-LDAP-FilterBuilder",-1.0311673826,1.3164424951,-1.5505907465,"https://salsa.debian.org/perl-team/modules/packages/libnet-ldap-filterbuilder-perl","https://github.com/ollyg/Net-LDAP-FilterBuilder.git",3727.9931481482,1,4,0,2,2,0,0,2,2,"2",1.8,2 -"libnet-ldapapi-perl",0.3298012331,4.2171229252,-0.937584259,"https://github.com/whm/libnet-ldapapi-perl","https://github.com/whm/libnet-ldapapi-perl",2319.3761458333,0,8,0,3,3,0,0,3,1,"1",2,2 -"Net-Netmask",0.1949090184,1.297397456,-0.0893189593,"https://salsa.debian.org/perl-team/modules/packages/libnet-netmask-perl","https://github.com/jmaslak/Net-Netmask.git",4478.3867592593,1,7,0,6,3,0,0,7,3,"3",1.875,1.42857142857143 -"Net-OpenID-Server",-1.0955544028,0.6845393717,-1.5372515082,"https://salsa.debian.org/perl-team/modules/packages/libnet-openid-server-perl","https://github.com/robn/Net-OpenID-Server.git",848.2155092593,2,3,0,3,3,0,0,4,1,"1",1.6,1.75 -"Net-SMTP-TLS",-0.1132113761,2.611489661,-0.7024918462,"https://salsa.debian.org/perl-team/modules/packages/libnet-smtp-tls-butmaintained-perl","https://github.com/fayland/Net-SMTP-TLS",3215.1503240741,2,5,0,4,4,0,0,4,2,"2",1.71428571428571,2 -"libnfo",-1.6756209904,0.1206412877,-2.1869772617,"https://salsa.debian.org/debian/libnfo","https://github.com/GeeXboX/libnfo",1108.0312384259,0,6,0,3,0,0,0,3,1,"1",2,1 -"libnids",1.4807006894,2.868899345,0.7254298026,"https://salsa.debian.org/pkg-security-team/libnids","https://github.com/MITRECND/libnids.git",3593.0894791667,1,9,0,6,10,0,0,12,2,"2",1.9,1.83333333333333 -"number-fraction",-1.540099922,1.0079905103,-2.1216475277,"https://salsa.debian.org/perl-team/modules/packages/libnumber-fraction-perl","https://github.com/p5-number-fraction/number-fraction.git",5664.8216203704,3,11,0,5,9,0,0,9,4,"4",1.78571428571429,2 -"libofa",0.4733582109,1.4335688496,0.0963115975,"https://salsa.debian.org/debian/libofa","https://github.com/tanob/libofa.git",2279.4909837963,1,2,0,1,3,0,0,3,1,"1",1.66666666666667,2 -"libolecf",0.4621655423,3.3267217863,-0.317708483,"https://salsa.debian.org/pkg-security-team/libolecf","https://github.com/libyal/libolecf.git",3351.0533101852,0,1,0,1,5,0,2,7,2,"2",2,1.71428571428571 -"libopenaptx",-1.7697893715,0.4021046488,-2.2318938305,"https://salsa.debian.org/debian/libopenaptx","https://github.com/pali/libopenaptx",1024.2505671296,0,2,0,2,31,0,0,31,1,"1",2,2 -"pal",-0.7436164089,0.7988128956,-1.0249643964,"https://salsa.debian.org/med-team/libpal-java","https://github.com/tamuri/pal",382.9409953704,0,2,0,1,0,0,0,1,1,"1",2,1 -"p5-Palm",0.0204029609,1.2197989009,-0.348294955,"https://salsa.debian.org/perl-team/modules/packages/libpalm-perl","https://github.com/madsen/p5-Palm",2036.3955092593,2,5,0,5,0,0,0,5,1,"1",1.71428571428571,1 -"pam-encfs",-0.0672752006,1.0391890178,-0.5514410008,"https://salsa.debian.org/debian/libpam-encfs","https://github.com/tinti/pam-encfs",2773.2122222222,0,4,0,2,2,0,0,4,2,"2",2,1.5 -"libpam-pwdfile",-0.1067432026,0.5002558718,-0.3226316808,"https://github.com/tiwe-de/libpam-pwdfile/tree/debian","https://github.com/tiwe-de/libpam-pwdfile",923.3027546296,2,2,0,2,8,0,0,9,1,"1",1.5,1.88888888888889 -"PGObject-Type-DateTime",-1.4815397898,0.6709430232,-1.9159731716,"https://salsa.debian.org/perl-team/modules/packages/libpgobject-type-datetime-perl","https://github.com/ledgersmb/PGObject-Type-DateTime.git",3652.6989467593,0,8,0,4,6,0,0,6,2,"2",2,2 -"PGObject-Util-DBAdmin",-1.5448908629,0.6014090328,-1.9825388902,"https://salsa.debian.org/perl-team/modules/packages/libpgobject-util-dbadmin-perl","https://github.com/ledgersmb/PGObject-Util-DBAdmin.git",2615.9496412037,0,5,0,3,10,0,0,10,1,"1",2,2 -"pgp-sign",-0.5037910117,2.2440221924,-1.3324653392,"https://salsa.debian.org/rra/libpgp-sign-perl","https://github.com/rra/pgp-sign",2555.0956134259,1,5,0,2,2,0,0,2,1,"1",1.83333333333333,2 -"perl5-PGPLOT",-0.1986814175,1.8032644315,-0.9289181032,"https://salsa.debian.org/perl-team/modules/packages/libpgplot-perl","https://github.com/PDLPorters/perl5-PGPLOT.git",2564.25125,4,7,0,6,6,0,0,7,1,"1",1.63636363636364,1.85714285714286 -"Plack-Middleware-CSRFBlock",-2.8898967554,-0.7198364868,-3.3240833199,"https://salsa.debian.org/perl-team/modules/packages/libplack-middleware-csrfblock-perl","https://github.com/mattp-/Plack-Middleware-CSRFBlock",1436.9725347222,1,7,0,3,3,0,0,4,1,"1",1.875,1.75 -"Plack-Middleware-Deflater",-0.8686046005,1.4026303206,-1.3409550295,"https://salsa.debian.org/perl-team/modules/packages/libplack-middleware-deflater-perl","https://github.com/miyagawa/Plack-Middleware-Deflater.git",4308.6622222222,0,5,0,3,10,0,0,11,3,"3",2,1.90909090909091 -"Plack-Middleware-File-Sass",-3.742621833,-1.2109466542,-4.3202138211,"https://salsa.debian.org/perl-team/modules/packages/libplack-middleware-file-sass-perl","https://github.com/miyagawa/Plack-Middleware-File-Sass.git",372.7359490741,0,1,0,1,4,0,0,5,1,"1",2,1.8 -"plack-test-anyevent",-2.2481916187,0.456054425,-2.955500627,"https://salsa.debian.org/perl-team/modules/packages/libplack-test-anyevent-perl","https://github.com/hoelzro/plack-test-anyevent.git",2226.7020138889,0,6,0,3,7,0,0,7,1,"1",2,2 -"pod-2-docbook",-2.1858439437,0.1225281674,-2.6170683957,"https://salsa.debian.org/perl-team/modules/packages/libpod-2-docbook-perl","https://github.com/jozef/pod-2-docbook",1292.6652546296,0,6,0,3,2,0,0,3,1,"1",2,1.66666666666667 -"libpod-webserver-perl",-0.4204997081,2.3714699089,-1.5368509522,"https://github.com/mogaal/libpod-webserver-perl","https://github.com/mogaal/libpod-webserver-perl",801.0357291667,1,1,0,1,1,0,0,2,1,"1",1.5,1.5 -"Pod-Wordlist-hanekomu",-2.3524762868,-0.0387599898,-2.7860641364,"https://salsa.debian.org/perl-team/modules/packages/libpod-wordlist-hanekomu-perl","https://github.com/dagolden/Pod-Wordlist-hanekomu",1571.1035763889,0,3,0,2,0,0,0,2,1,"1",2,1 -"poe-component-client-http",-1.0501503685,-0.2644618645,-1.3283877911,"https://salsa.debian.org/perl-team/modules/packages/libpoe-component-client-http-perl","https://github.com/rcaputo/poe-component-client-http",2297.0143402778,1,4,0,7,6,0,0,10,1,"1",1.8,1.6 -"poe-component-client-ident",-2.7407891821,-1.3969533145,-3.0142475956,"https://salsa.debian.org/perl-team/modules/packages/libpoe-component-client-ident-perl","https://github.com/bingos/poe-component-client-ident.git",49.7081481481,0,1,0,1,0,0,0,1,1,"1",2,1 -"poe-component-client-keepalive",-0.9123072197,1.3895866184,-1.3489172881,"https://salsa.debian.org/perl-team/modules/packages/libpoe-component-client-keepalive-perl","https://github.com/rcaputo/poe-component-client-keepalive.git",2357.5085300926,2,4,0,8,6,0,0,10,1,"1",1.66666666666667,1.6 -"poe-filter-ircd",-0.3745579428,1.9358389215,-0.8315150468,"https://salsa.debian.org/perl-team/modules/packages/libpoe-filter-ircd-perl","https://github.com/bingos/poe-filter-ircd.git",1552.6868865741,0,4,0,3,1,0,0,3,1,"1",2,1.33333333333333 -"poe-loop-tk",-0.195847078,2.023755452,-0.7553813013,"https://salsa.debian.org/perl-team/modules/packages/libpoe-loop-tk-perl","https://github.com/rcaputo/poe-loop-tk",2011.4116435185,0,7,0,11,1,0,0,12,1,"1",2,1.08333333333333 -"Probe-Perl",-0.1208694783,2.6826431693,-0.7468528277,"https://salsa.debian.org/perl-team/modules/packages/libprobe-perl-perl","https://github.com/kenahoo/Probe-Perl",112.0281712963,0,2,0,1,0,0,0,1,1,"1",2,1 -"perl-proc-processtable",0.037499403,0.4824843529,-0.0771518619,"https://salsa.debian.org/perl-team/modules/packages/libproc-processtable-perl","https://github.com/jwbargsten/perl-proc-processtable",3896.7371180556,1,25,0,20,24,0,0,25,3,"3",1.96153846153846,1.96 -"libpuzzle",-0.6680140267,0.6529557031,-1.1243331237,"https://salsa.debian.org/debian-phototools-team/libpuzzle","https://github.com/jedisct1/libpuzzle",2324.9386458333,1,8,0,5,25,0,0,26,1,"1",1.88888888888889,1.96153846153846 -"libpwquality",0.5103514314,1.8778785061,0.0684762008,"https://salsa.debian.org/gnome-team/libpwquality","https://github.com/libpwquality/libpwquality.git",4429.9063773148,51,15,0,49,43,0,0,74,3,"3",1.22727272727273,1.58108108108108 -"libqcow",0.4345572635,3.1501552197,-0.2914212024,"https://salsa.debian.org/pkg-security-team/libqcow","https://github.com/libyal/libqcow.git",3715.7671527778,0,1,0,1,19,0,2,21,2,"2",2,1.9047619047619 -"p5-rdf-acl",-2.0654979491,1.2809082376,-3.0733910723,"https://salsa.debian.org/perl-team/modules/packages/librdf-acl-perl","https://github.com/tobyink/p5-rdf-acl",1688.9962731482,0,1,0,1,0,0,0,1,1,"1",2,1 -"RDF-aREF",-1.6321655974,0.5126731294,-2.0632435211,"https://salsa.debian.org/perl-team/modules/packages/librdf-aref-perl","https://github.com/nichtich/RDF-aREF.git",2565.8667708333,2,8,0,4,11,0,1,12,1,"1",1.8,1.91666666666667 -"RDF-Generator-Void",-1.6331954297,0.6259569496,-2.0634280229,"https://salsa.debian.org/perl-team/modules/packages/librdf-generator-void-perl","https://github.com/kjetilk/RDF-Generator-Void.git",1725.5093171296,0,6,0,4,4,0,0,5,1,"1",2,1.8 -"RDF-Helper-Properties",-1.4850797677,1.0749945226,-2.1065327245,"https://salsa.debian.org/perl-team/modules/packages/librdf-helper-properties-perl","https://github.com/kjetilk/RDF-Helper-Properties.git",2324.5435416667,0,5,0,3,5,0,0,5,1,"1",2,2 -"RDF-LinkedData",-1.5297189997,-0.0678424369,-2.0840021227,"https://salsa.debian.org/perl-team/modules/packages/librdf-linkeddata-perl","https://github.com/kjetilk/RDF-LinkedData.git",4060.5603472222,0,7,0,4,7,0,0,7,3,"3",2,2 -"p5-rdf-ns-curated",-1.1846297848,1.0171931504,-1.6213429531,"https://salsa.debian.org/perl-team/modules/packages/librdf-ns-curated-perl","https://github.com/kjetilk/p5-rdf-ns-curated.git",2949.064224537,0,4,0,3,5,0,0,5,2,"2",2,2 -"RDF-NS",-0.5250160099,1.01221794,-0.8720836033,"https://salsa.debian.org/perl-team/modules/packages/librdf-ns-perl","https://github.com/nichtich/RDF-NS.git",4253.4168518519,2,5,0,4,13,0,0,13,3,"3",1.71428571428571,2 -"p5-rdf-query-client",-1.1913139725,0.7502046078,-1.7548289358,"https://salsa.debian.org/perl-team/modules/packages/librdf-query-client-perl","https://github.com/tobyink/p5-rdf-query-client",1767.4564930556,0,1,0,1,2,0,0,2,1,"1",2,2 -"libSavitar",-0.0624513388,1.310740378,-0.382634692,"https://salsa.debian.org/3dprinting-team/libsavitar","https://github.com/Ultimaker/libSavitar.git",2417.8881481482,12,19,0,17,35,0,0,38,1,"1",1.61290322580645,1.92105263157895 -"libsbsms",0.1678753971,1.6421405226,-0.1313541464,"https://salsa.debian.org/multimedia-team/libsbsms","https://github.com/claytonotey/libsbsms.git",571.9734837963,2,6,0,5,9,0,0,9,1,"1",1.75,2 -"p5-scalar-does",-0.5366651555,1.2277898949,-0.9504713641,"https://salsa.debian.org/perl-team/modules/packages/libscalar-does-perl","https://github.com/tobyink/p5-scalar-does",1614.181099537,0,3,0,1,2,0,0,2,1,"1",2,2 -"libscca",0.4636827697,3.5204192618,-0.331124383,"https://salsa.debian.org/pkg-security-team/libscca","https://github.com/libyal/libscca",3348.012650463,1,1,0,2,11,0,2,13,2,"2",1.5,1.84615384615385 -"SDL_net",0.2879256018,2.7048282977,-0.176557932,"https://salsa.debian.org/sdl-team/libsdl2-net","https://github.com/libsdl-org/SDL_net.git",5565.0336111111,10,12,0,14,0,0,0,14,4,"4",1.54545454545455,1 -"perl-SHARYANTO-Utils",-2.3441465625,-0.0852227274,-2.7855609174,"https://salsa.debian.org/perl-team/modules/packages/libsharyanto-utils-perl","https://github.com/perlancar/perl-SHARYANTO-Utils.git",2945.5977546296,0,13,0,2,4,0,0,5,2,"2",2,1.8 -"simpleini",-3.1256993279,-0.5243099389,-3.727940764,"https://salsa.debian.org/yangfl-guest/simpleini","https://github.com/brofield/simpleini",5767.1290509259,12,11,0,17,66,0,0,66,4,"4",1.47826086956522,2 -"libsmdev",0.4901912636,3.5473022844,-0.3181659308,"https://salsa.debian.org/pkg-security-team/libsmdev","https://github.com/libyal/libsmdev",2801.6257060185,0,1,0,1,7,0,2,9,2,"2",2,1.77777777777778 -"libsml",-2.5583752988,0.0607386648,-3.2378106609,"https://github.com/volkszaehler/libsml/tree/debian","https://github.com/volkszaehler/libsml",4561.3065740741,12,15,0,19,11,0,0,23,3,"3",1.55555555555556,1.47826086956522 -"libsmraw",0.4741059034,3.3966321112,-0.3210256742,"https://salsa.debian.org/pkg-security-team/libsmraw","https://github.com/libyal/libsmraw.git",2800.5750925926,0,1,0,1,3,0,2,5,2,"2",2,1.6 -"SNMP-Extension-PassPersist",0.1226846415,3.0805333609,-0.7398128832,"https://salsa.debian.org/perl-team/modules/packages/libsnmp-extension-passpersist-perl","https://github.com/maddingue/SNMP-Extension-PassPersist.git",1526.080787037,0,1,0,1,2,0,0,3,1,"1",2,1.66666666666667 -"SOAP-WSDL",0.2494473126,2.2213700721,-0.2151765381,"https://salsa.debian.org/perl-team/modules/packages/libsoap-wsdl-perl","https://github.com/scrottie/SOAP-WSDL",3956.8486342593,2,7,0,5,8,0,0,8,3,"3",1.77777777777778,2 -"debian-libsodium",0.7652440851,2.6480355078,0.1255307975,"https://github.com/gcsideal/debian-libsodium","https://github.com/gcsideal/debian-libsodium",2198.6639814815,0,2,0,2,3,0,0,5,1,"1",2,1.6 -"sort-naturally",0.7344792523,3.7354162178,-0.0108935716,"https://salsa.debian.org/perl-team/modules/packages/libsort-naturally-perl","https://github.com/bingos/sort-naturally.git",681.4402893519,0,3,0,3,6,0,0,7,1,"1",2,1.85714285714286 -"term-ui",0.3980651932,2.5988929786,-0.0533124701,"https://salsa.debian.org/perl-team/modules/packages/libterm-ui-perl","https://github.com/jib/term-ui.git",4487.1224074074,4,10,0,11,10,0,0,11,3,"3",1.71428571428571,1.90909090909091 -"Test-Cmd",-1.4068778673,-0.2437675076,-1.6282879603,"https://salsa.debian.org/perl-team/modules/packages/libtest-cmd-perl","https://github.com/neilb/Test-Cmd.git",4572.2283101852,1,7,0,4,6,0,0,7,3,"3",1.875,1.85714285714286 -"test-compile",-0.1757790814,2.2630567936,-0.8030738551,"https://salsa.debian.org/perl-team/modules/packages/libtest-compile-perl","https://github.com/egiles/test-compile",5567.3756018519,2,14,0,11,11,0,0,12,4,"4",1.875,1.91666666666667 -"test-corpus-audio-mpd",-2.7413583357,-1.3992673585,-3.0159490653,"https://salsa.debian.org/perl-team/modules/packages/libtest-corpus-audio-mpd-perl","http://github.com/jquelin/test-corpus-audio-mpd",904.9165856481,0,2,0,0,0,0,0,0,1,"1",2,NA -"Test-Database",-1.833809135,0.6133274632,-2.3400867988,"https://salsa.debian.org/perl-team/modules/packages/libtest-database-perl","https://github.com/book/Test-Database.git",2702.2549537037,3,2,0,5,6,0,0,9,1,"1",1.4,1.66666666666667 -"Test-File-Contents",-1.1809622978,0.4343778683,-1.4826469865,"https://salsa.debian.org/perl-team/modules/packages/libtest-file-contents-perl","https://github.com/ap/Test-File-Contents.git",4644.3475115741,2,4,0,3,8,0,0,9,3,"3",1.66666666666667,1.88888888888889 -"Test-Perl-Critic",0.2642060273,2.9016834456,-0.5237825629,"https://salsa.debian.org/perl-team/modules/packages/libtest-perl-critic-perl","https://github.com/Perl-Critic/Test-Perl-Critic.git",4634.7458449074,0,9,0,6,19,0,0,20,3,"3",2,1.95 -"Test-Pod-Coverage",-0.201777392,1.0831475883,-0.4327477008,"https://salsa.debian.org/perl-team/modules/packages/libtest-pod-coverage-perl","https://github.com/neilbowers/Test-Pod-Coverage",1677.1204166667,1,2,0,2,4,0,0,5,1,"1",1.66666666666667,1.8 -"test-prereq",-1.8896057083,-0.3676533696,-2.1546117193,"https://salsa.debian.org/perl-team/modules/packages/libtest-prereq-perl","https://github.com/briandfoy/test-prereq.git",2918.7659375,4,8,0,7,13,0,0,14,2,"2",1.66666666666667,1.92857142857143 -"Test-RDF",-1.5273740593,1.1507063443,-2.1229709088,"https://salsa.debian.org/perl-team/modules/packages/libtest-rdf-perl","https://github.com/kjetilk/Test-RDF.git",2744.0844328704,0,3,0,2,4,0,0,4,1,"1",2,2 -"Test-RedisServer",-2.9408349327,-0.0880954323,-3.6685151023,"https://salsa.debian.org/perl-team/modules/packages/libtest-redisserver-perl","https://github.com/typester/Test-RedisServer.git",3497.317025463,0,12,0,6,19,0,0,19,2,"2",2,2 -"Test-Strict",0.0413930215,1.9710003237,-0.4917254856,"https://salsa.debian.org/perl-team/modules/packages/libtest-strict-perl","https://github.com/manwar/Test-Strict.git",2362.5205092593,1,15,0,11,23,0,0,23,1,"1",1.9375,2 -"Test-XPath",-1.6970041276,0.5827254278,-2.146747561,"https://salsa.debian.org/perl-team/modules/packages/libtest-xpath-perl","https://github.com/manwar/Test-XPath.git",4673.8964699074,1,7,0,5,9,0,0,10,3,"3",1.875,1.9 -"Text-CSV_XS",0.3210443384,2.3035648179,-0.0928202393,"https://salsa.debian.org/perl-team/modules/packages/libtext-csv-xs-perl","https://github.com/Tux/Text-CSV_XS.git",5755.1094907407,9,17,0,13,37,0,0,39,4,"4",1.65384615384615,1.94871794871795 -"Text-Diff",0.3186250385,2.4917818706,-0.1685547916,"https://salsa.debian.org/perl-team/modules/packages/libtext-diff-perl","https://github.com/neilb/Text-Diff",2314.1856018519,0,6,0,3,4,0,0,4,1,"1",2,2 -"p5-Text-FindIndent",-0.5555131835,1.6711252899,-1.0083252674,"https://salsa.debian.org/perl-team/modules/packages/libtext-findindent-perl","https://github.com/tsee/p5-Text-FindIndent.git",3337.1243287037,0,6,0,2,1,0,0,2,2,"2",2,1.5 -"text-markdown",0.9343197619,4.332977055,-0.1666854375,"https://salsa.debian.org/perl-team/modules/packages/libtext-markdown-perl","https://github.com/bobtfish/text-markdown.git",2874.5088194445,0,12,0,7,40,0,0,41,2,"2",2,1.97560975609756 -"text-multimarkdown",0.2517262893,2.9301320017,-0.5540498908,"https://salsa.debian.org/perl-team/modules/packages/libtext-multimarkdown-perl","https://github.com/bobtfish/text-multimarkdown.git",2348.7609953704,0,10,0,6,15,0,0,18,1,"1",2,1.83333333333333 -"Text-Soundex",0.8131696461,4.2054082056,0.0081736989,"https://salsa.debian.org/perl-team/modules/packages/libtext-soundex-perl","https://github.com/rjbs/Text-Soundex",1152.2136342593,3,2,0,3,0,0,0,3,1,"1",1.4,1 -"perl-Text-sprintfn",-0.8179589658,2.1500712495,-1.6069534948,"https://salsa.debian.org/perl-team/modules/packages/libtext-sprintfn-perl","https://github.com/perlancar/perl-Text-sprintfn",2949.61625,0,11,0,2,2,0,0,3,2,"2",2,1.66666666666667 -"thread_pool",-0.5406636263,1.505263536,-1.0728830879,"https://salsa.debian.org/med-team/libthread-pool","https://github.com/rvaser/thread_pool",1629.2300810185,1,4,0,1,6,0,0,6,1,"1",1.8,2 -"libthumbor",-3.097994256,-0.4370183469,-3.7171702145,"https://salsa.debian.org/python-team/packages/libthumbor","https://github.com/thumbor/libthumbor",4029.2128125,6,18,0,14,40,0,7,48,3,"3",1.75,1.83333333333333 -"Tie-IxHash",0.7308735457,3.2747506675,0.0615000078,"https://salsa.debian.org/perl-team/modules/packages/libtie-ixhash-perl","https://github.com/chorny/Tie-IxHash.git",1314.8113773148,1,4,0,2,6,0,0,6,1,"1",1.8,2 -"tools.logging",-0.0293820524,2.7335220749,-0.6673515718,"https://salsa.debian.org/clojure-team/libtools-logging-clojure","https://github.com/clojure/tools.logging.git",4541.1196180556,3,16,0,7,0,0,0,7,3,"3",1.84210526315789,1 -"p5-types-datetime",-1.2224253104,1.1350772403,-1.7134370382,"https://salsa.debian.org/perl-team/modules/packages/libtypes-datetime-perl","https://github.com/tobyink/p5-types-datetime",1190.8059837963,1,4,0,3,5,0,0,5,1,"1",1.8,2 -"libunibreak",0.3910707314,2.538413373,-0.1234807159,"https://salsa.debian.org/qt-kde-team/3rdparty/libunibreak","https://github.com/adah1972/libunibreak.git",5748.0207407407,6,11,0,12,26,0,3,29,4,"4",1.64705882352941,1.89655172413793 -"libuninameslist",0.4875132738,2.4863001693,-0.0941545187,"https://salsa.debian.org/fonts-team/libuninameslist","https://github.com/fontforge/libuninameslist",5640.1865740741,5,13,0,13,19,0,0,20,4,"4",1.72222222222222,1.95 -"usbauth-all",-0.6014875746,1.9320845325,-1.2251803558,"https://salsa.debian.org/debian/libusbauth-configparser","https://github.com/kochstefan/usbauth-all.git",2917.2837384259,3,5,0,2,7,0,0,7,2,"2",1.625,2 -"vcs-lite",-0.8542886427,1.4604399952,-1.3294177339,"https://salsa.debian.org/perl-team/modules/packages/libvcs-lite-perl","http://github.com/barbie/vcs-lite",1975.3471527778,0,1,0,0,0,0,0,0,1,"1",2,NA -"libverto",2.4189536777,5.947206779,1.0158918925,"https://salsa.debian.org/debian/libverto","https://github.com/latchset/libverto",3721.9244907408,8,2,0,9,9,0,0,14,2,"2",1.2,1.64285714285714 -"libvhdi",0.6481021454,3.1352052875,-0.1671545473,"https://salsa.debian.org/pkg-security-team/libvhdi","https://github.com/libyal/libvhdi.git",3717.6224074074,1,1,0,2,16,0,2,18,2,"2",1.5,1.88888888888889 -"vitacilina",-3.6021180136,-0.769754564,-4.2924781327,"https://salsa.debian.org/perl-team/modules/packages/libvitacilina-perl","https://github.com/damog/vitacilina.git",2796.7499884259,1,5,0,4,5,0,0,6,2,"2",1.83333333333333,1.83333333333333 -"libvmdk",0.9664788559,4.388428618,-0.090886102,"https://salsa.debian.org/pkg-security-team/libvmdk","https://github.com/libyal/libvmdk.git",2936.766087963,2,1,0,3,29,0,2,31,2,"2",1.33333333333333,1.93548387096774 -"perl5-XML-Compile-WSDL11",-1.4310286216,0.7419388273,-1.8594446745,"https://salsa.debian.org/perl-team/modules/packages/libxml-compile-wsdl11-perl","https://github.com/markov2/perl5-XML-Compile-WSDL11",1204.3164351852,0,2,0,1,0,0,0,1,1,"1",2,1 -"XML-Encoding",-0.7093222742,1.489807431,-1.1875178918,"https://salsa.debian.org/perl-team/modules/packages/libxml-encoding-perl","https://github.com/steve-m-hay/XML-Encoding.git",2428.8622685185,1,1,0,1,0,0,0,1,1,"1",1.5,1 -"perl-XML-Generator",-0.4859689923,1.0279841867,-0.8301607275,"https://salsa.debian.org/perl-team/modules/packages/libxml-generator-perl","https://github.com/timlegge/perl-XML-Generator",442.0406828704,0,3,0,2,0,0,0,2,1,"1",2,1 -"XML-SAX-Expat",0.7084412925,2.9227171248,0.0786452436,"https://salsa.debian.org/perl-team/modules/packages/libxml-sax-expat-perl","https://github.com/hoehrmann/XML-SAX-Expat",2544.4844675926,0,4,0,2,2,0,0,2,1,"1",2,2 -"xml-sax-machines",-0.9628604737,0.4253404586,-1.269754049,"https://salsa.debian.org/perl-team/modules/packages/libxml-sax-machines-perl","https://github.com/perigrin/xml-sax-machines.git",1529.9486111111,1,2,0,1,2,0,0,2,1,"1",1.66666666666667,2 -"xml-sax",0.996402312,2.2577312148,0.3914828238,"https://salsa.debian.org/perl-team/modules/packages/libxml-sax-perl","https://github.com/grantm/xml-sax",3966.2573726852,0,6,0,3,4,0,0,5,3,"3",2,1.8 -"p5-xml-saxon-xslt2",-1.0066125051,2.2847267339,-1.8645802565,"https://salsa.debian.org/perl-team/modules/packages/libxml-saxon-xslt2-perl","https://github.com/tobyink/p5-xml-saxon-xslt2",1518.5208564815,0,1,0,1,2,0,0,2,1,"1",2,2 -"xmlbird",0.3929313241,3.1477652867,-0.4381392316,"https://salsa.debian.org/fonts-team/libxmlbird","https://github.com/johanmattssonm/xmlbird.git",3048.2602777778,1,7,0,6,9,0,0,9,2,"2",1.875,2 -"YAML-AppConfig",-0.2806665447,2.1538425871,-0.9966889755,"https://salsa.debian.org/perl-team/modules/packages/libyaml-appconfig-perl","https://github.com/Xaerxess/YAML-AppConfig",1551.2373611111,5,2,0,4,0,0,0,4,1,"1",1.28571428571429,1 -"libydpdict",-1.336791229,0.3110794516,-1.7407427608,"https://github.com/porridge/libydpdict","https://github.com/porridge/libydpdict",5005.9569675926,1,3,0,2,1,0,0,2,4,"4",1.75,1.5 -"libzeep",-1.527909209,-0.6468594182,-1.7548572329,"https://salsa.debian.org/med-team/libzeep","https://github.com/mhekkel/libzeep.git",5502.8286342593,2,5,0,2,10,0,0,10,4,"4",1.71428571428571,2 -"20kly",1.4342234885,4.3783383344,0.2667152562,"https://salsa.debian.org/python-team/packages/lightyears","https://github.com/20kly/20kly.git",4073.732349537,0,3,0,1,5,0,0,5,3,"3",2,2 -"lilv",0.3731954954,1.1783141026,0.0585307699,"https://salsa.debian.org/multimedia-team/lilv","https://github.com/lv2/lilv.git",5733.8443518519,8,1,0,9,44,0,0,45,4,"4",1.11111111111111,1.97777777777778 -"limereg",0.2360714075,2.909288917,-0.7247260854,"https://salsa.debian.org/science-team/limereg","https://github.com/RoelofBerg/limereg.git",1172.0418171296,0,3,0,2,6,0,0,6,1,"1",2,2 -"logtop",0.3498096662,3.7145308344,-0.5283480087,"https://github.com/JulienPalard/logtop","https://github.com/JulienPalard/logtop",3192.2077430556,0,9,0,4,8,0,0,8,2,"2",2,2 -"lolcat",0.6721262935,3.1765432052,-0.1088405445,"https://salsa.debian.org/ruby-team/lolcat","https://github.com/busyloop/lolcat.git",3767.9154513889,1,19,0,15,63,0,0,72,3,"3",1.95,1.875 -"loqui",-1.7007984788,0.6039967407,-2.1464740031,"https://salsa.debian.org/debian/loqui","https://github.com/sunnyone/loqui.git",4178.2538078704,1,9,0,3,2,0,0,3,3,"3",1.9,1.66666666666667 -"lsmount",0.241790673,3.2370471304,-0.6151908303,"https://github.com/Llandon/lsmount","https://github.com/Llandon/lsmount",2894.8834259259,1,4,0,1,3,0,0,3,2,"2",1.8,2 -"ltsp",-0.2605389691,-0.1270230433,-0.35762279,"https://github.com/ltsp/ltsp/","https://github.com/ltsp/ltsp",1481.8791782407,11,5,0,10,11,0,25,43,1,"1",1.3125,1.25581395348837 -"luadbi",0.1585813148,2.686351466,-0.4949553216,"https://salsa.debian.org/lua-team/lua-dbi","https://github.com/mwild1/luadbi",2870.1189699074,1,15,0,9,30,0,0,31,2,"2",1.9375,1.96774193548387 -"luaexpat",0.0739779286,0.7317384216,-0.0425516616,"https://salsa.debian.org/lua-team/lua-expat","https://github.com/lunarmodules/luaexpat",4256.8331365741,4,6,0,7,11,0,0,11,3,"3",1.6,2 -"linotify",-0.5779890984,2.143926952,-1.2238495501,"https://salsa.debian.org/lua-team/lua-inotify","https://github.com/hoelzro/linotify.git",2964.3124768519,3,9,0,8,16,0,0,18,2,"2",1.75,1.88888888888889 -"lualdap",0.0504029107,1.7349223597,-0.4425312123,"https://salsa.debian.org/lua-team/lua-ldap","https://github.com/lualdap/lualdap.git",4408.7069791667,7,12,0,13,25,0,0,30,3,"3",1.63157894736842,1.83333333333333 -"say",0.0600475565,3.4355060639,-0.8262923484,"https://salsa.debian.org/lua-team/lua-say","https://github.com/lunarmodules/say.git",4008.0407638889,1,11,0,8,11,0,0,11,3,"3",1.91666666666667,2 -"lyaml",-0.3454983994,1.9583709762,-0.7980928636,"https://salsa.debian.org/lua-team/lua-yaml/","https://github.com/gvvaughan/lyaml",3607.2911111111,1,7,1,6,63,0,0,63,2,"2",1.875,2 -"lunar-date",-1.0901325066,-0.0609883227,-1.3741924046,"https://salsa.debian.org/chinese-team/lunar-date","https://github.com/yetist/lunar-date",5400.1525115741,1,8,0,2,12,0,0,12,4,"4",1.88888888888889,2 -"luola",-0.2736280431,0.4554221137,-0.5709254832,"https://salsa.debian.org/debian/luola","https://github.com/callaa/luola.git",0.009537037,0,1,0,1,2,0,0,3,1,"1",2,1.66666666666667 -"lv2file",0.6267118175,3.5316112473,-0.3364614164,"https://salsa.debian.org/multimedia-team/lv2file","https://github.com/jeremysalwen/lv2file.git",4139.5358449074,2,9,0,4,7,0,0,9,3,"3",1.81818181818182,1.77777777777778 -"lwt",-0.134408789,0.9137216874,-0.5254639396,"https://salsa.debian.org/ocaml-team/lwt","https://github.com/ocsigen/lwt.git",5681.6560300926,82,99,0,111,0,0,0,111,4,"4",1.54696132596685,1 -"lxappearance",2.8189754808,5.1307581038,1.6743807599,"https://salsa.debian.org/lxde-team/lxappearance","https://github.com/lxde/lxappearance.git",4801.901712963,111,38,0,71,12,0,0,76,3,"3",1.25503355704698,1.15789473684211 -"lxsession",1.2116112613,1.9433064205,0.7300432073,"https://salsa.debian.org/lxde-team/lxsession","https://github.com/lxde/lxsession.git",5699.8882175926,92,44,0,68,24,0,0,80,4,"4",1.32352941176471,1.3 -"lz4json",-0.4492537171,1.9714794785,-0.9639366883,"https://github.com/kilobyte/lz4json/tree/debian","https://github.com/kilobyte/lz4json",1639.7853125,4,5,0,5,0,0,0,5,1,"1",1.55555555555556,1 -"mac-fdisk-debian",2.7880780441,5.7864461789,1.4460748362,"https://github.com/glaubitz/mac-fdisk-debian","https://github.com/glaubitz/mac-fdisk-debian",0.0261342593,1,1,0,1,1,0,0,2,1,"1",1.5,1.5 -"MACTelnet-Debian-Packaging",0.2259589335,2.9645776481,-0.5410252908,"https://github.com/haakonnessjoen/MACTelnet-Debian-Packaging","https://github.com/haakonnessjoen/MACTelnet-Debian-Packaging",1885.9548726852,0,3,0,1,3,0,0,3,1,"1",2,2 -"madwimax",0.5386816454,4.8433430858,-0.9450458426,"http://github.com/ago/madwimax","http://github.com/ago/madwimax",1040.9560532407,1,3,0,0,0,0,0,0,1,"1",1.75,NA -"magicrescue",0.5638588917,1.9092658203,-0.0393062113,"https://salsa.debian.org/pkg-security-team/magicrescue","https://github.com/jbj/magicrescue",1064.0338194445,1,3,0,2,2,0,0,2,1,"1",1.75,2 -"magit-popup",0.2571268821,2.5085186003,-0.2260041619,"https://salsa.debian.org/emacsen-team/magit-popup","https://github.com/magit/magit-popup.git",3610.5775925926,17,32,0,43,14,0,0,53,2,"2",1.6530612244898,1.26415094339623 -"emacsen-team",-0.9153485178,0.2878604704,-1.1484533672,"https://salsa.debian.org/emacsen-team/magithub","https://salsa.debian.org/emacsen-team/magithub",1074.2872569445,13,18,0,0,0,0,0,0,1,"1",1.58064516129032,NA -"mando",-0.8468044385,1.2154767785,-1.3465386928,"https://salsa.debian.org/python-team/packages/mando","https://github.com/rubik/mando.git",3495.7249768519,7,5,0,9,21,0,0,21,2,"2",1.41666666666667,2 -"manpages-zh",0.3013864409,1.4801748551,-0.1366673269,"https://salsa.debian.org/chinese-team/manpages-zh","https://github.com/man-pages-zh/manpages-zh",5615.6429976852,2,12,2,8,40,0,0,44,4,"4",1.85714285714286,1.90909090909091 -"manuel",-1.8188927476,0.9170806837,-2.5490910041,"https://salsa.debian.org/python-team/packages/manuel","https://github.com/benji-york/manuel",5520.6818171296,2,23,0,16,26,0,0,29,4,"4",1.92,1.89655172413793 -"marisa-trie",-0.2770059581,0.4130762278,-0.5523788144,"https://salsa.debian.org/input-method-team/marisa","https://github.com/s-yata/marisa-trie.git",1648.6119675926,1,9,0,7,42,0,0,42,1,"1",1.9,2 -"mate-backgrounds",0.5159356315,3.1381456756,-0.0659273196,"https://salsa.debian.org/debian-mate-team/mate-backgrounds","https://github.com/mate-desktop/mate-backgrounds.git",4154.5609837963,7,18,0,16,26,0,0,30,3,"3",1.72,1.86666666666667 -"mate-user-guide",0.5094536603,3.3401486345,-0.0704353393,"https://salsa.debian.org/debian-mate-team/mate-user-guide","https://github.com/mate-desktop/mate-user-guide.git",2933.2399768519,5,16,0,11,19,0,0,21,2,"2",1.76190476190476,1.9047619047619 -"mate-user-share",-0.0144878955,0.7287904866,-0.2142966004,"https://salsa.debian.org/debian-mate-team/mate-user-share","https://github.com/mate-desktop/mate-user-share.git",4144.6895601852,7,22,0,16,27,0,0,29,3,"3",1.75862068965517,1.93103448275862 -"mate-window-applets",-0.186625862,1.9636663587,-0.6313160521,"https://salsa.debian.org/debian-mate-team/mate-window-applets","https://github.com/ubuntu-mate/mate-window-applets.git",1140.5334375,6,3,0,6,20,0,0,20,1,"1",1.33333333333333,2 -"materia-theme",0.1045234392,1.9891123795,-0.3220563371,"https://salsa.debian.org/desktop-themes-team/materia-gtk-theme","https://github.com/nana-4/materia-theme/commits/master",5185.326875,55,11,0,0,0,0,0,0,4,"4",1.16666666666667,NA -"maybe",-0.652177661,1.9314993227,-1.1686602213,"https://salsa.debian.org/debian/maybe","https://github.com/p-e-w/maybe",363.7199652778,0,2,1,2,60,0,0,60,1,"1",2,2 -"marionette-collective",0.2172201034,1.7225219851,-0.4315505666,"https://salsa.debian.org/puppet-team/mcollective","https://github.com/puppetlabs/marionette-collective",3620.6848148148,74,101,0,96,3,0,0,99,2,"2",1.57714285714286,1.03030303030303 -"meanwhile",1.6225494468,3.5813327858,0.7214154539,"https://salsa.debian.org/debian/meanwhile","https://github.com/obriencj/meanwhile.git",352.0019560185,1,1,0,2,2,0,0,3,1,"1",1.5,1.66666666666667 -"medusa",0.7418834796,1.8416337033,0.1473000467,"https://salsa.debian.org/pkg-security-team/medusa","https://github.com/jmk-foofus/medusa",2618.4448032407,4,10,0,10,71,0,0,71,1,"1",1.71428571428571,2 -"memkind",-2.3338755247,-0.4330380435,-2.7754873055,"https://github.com/kilobyte/memkind/tree/debian","https://github.com/kilobyte/memkind",3438.6727199074,30,85,0,50,2,0,0,52,2,"2",1.73913043478261,1.03846153846154 -"memtest86plus",2.2601852863,3.3021289749,1.5576924368,"https://salsa.debian.org/debian/memtest86plus","https://github.com/memtest86plus/memtest86plus.git",663.5358564815,15,10,0,12,7,0,0,15,1,"1",1.4,1.46666666666667 -"mercator",-0.2340868407,1.6571874232,-0.993372484,"https://salsa.debian.org/games-team/mercator","https://github.com/worldforge/mercator",5633.2390393519,0,7,0,5,5,0,0,7,4,"4",2,1.71428571428571 -"minidb",-0.4525684191,1.7891094238,-0.9018820656,"https://salsa.debian.org/mwerlen/minidb","https://github.com/thp/minidb.git",4339.2984953704,2,5,0,6,13,0,0,13,3,"3",1.71428571428571,2 -"minieigen",-0.2097696756,0.7860654925,-0.499567475,"https://salsa.debian.org/science-team/minieigen","https://github.com/eudoxos/minieigen",4093.4507523148,0,12,0,7,18,0,0,18,3,"3",2,2 -"minisat",0.081865083,0.8637917657,-0.1532386767,"http://github.com/niklasso/minisat","http://github.com/niklasso/minisat",2028.9114699074,1,5,0,0,0,0,0,0,1,"1",1.83333333333333,NA -"mkalias",-0.7408475157,2.3071375002,-1.5762128281,"https://salsa.debian.org/ruby-team/mkalias","https://github.com/LucianoPC/mkalias",68.2117476852,0,3,0,2,2,0,0,3,1,"1",2,1.66666666666667 -"mktorrent",0.2711814394,1.9101515608,-0.3158320018,"https://salsa.debian.org/debian/mktorrent","https://github.com/pobrn/mktorrent",4360.041099537,6,10,1,14,72,0,4,77,3,"3",1.625,1.93506493506494 -"mmtf-java",-5.037602316,-2.8514886182,-5.4781542553,"https://salsa.debian.org/debichem-team/mmtf-java","https://github.com/rcsb/mmtf-java.git",2412.8476967593,1,12,0,6,13,0,0,13,1,"1",1.92307692307692,2 -"mmv",1.5597347679,2.9419260396,0.7739885392,"https://salsa.debian.org/debian/mmv","https://github.com/rrthomas/mmv.git",971.7580902778,1,1,0,2,10,0,0,10,1,"1",1.5,2 -"mod_proxy_msrpc",-0.4686771794,2.4036030859,-1.2427083432,"https://github.com/bombadil/mod_proxy_msrpc/tree/debian/unstable","https://github.com/bombadil/mod_proxy_msrpc",805.3717013889,0,4,0,1,20,0,1,21,1,"1",2,1.95238095238095 -"modem-cmd",-0.6052898943,1.7555013841,-1.1587030212,"https://salsa.debian.org/debian/modem-cmd","https://github.com/imZack/modem-cmd.git",939.0309143519,1,4,0,2,5,0,0,5,1,"1",1.8,2 -"modplug-tools",0.4632988211,2.9493569553,-0.4712506177,"https://salsa.debian.org/multimedia-team/modplugtools","https://github.com/alexmyczko/modplug-tools",1743.9280324074,2,5,0,3,4,0,0,4,1,"1",1.71428571428571,2 -"mom",-0.6777849161,1.9853085783,-1.5072869412,"https://salsa.debian.org/debian/mom","https://github.com/oVirt/mom",4972.7826157407,31,16,1,25,13,0,0,31,3,"3",1.34042553191489,1.41935483870968 -"mongo-c-driver",0.3915954735,1.6519342417,-0.0863313883,"https://github.com/mongodb/mongo-c-driver/tree/master","https://github.com/mongodb/mongo-c-driver",5226.5267939815,106,124,0,112,0,0,0,112,4,"4",1.53913043478261,1 -"montage-wrapper",-0.3865274729,1.1809812531,-0.6680117033,"https://salsa.debian.org/debian-astro-team/montage-wrapper","https://github.com/astropy/montage-wrapper",3566.7960416667,2,16,3,14,39,0,0,42,2,"2",1.88888888888889,1.92857142857143 -"mopidy-alsamixer",-0.098708743,2.9303656044,-0.8810971993,"https://salsa.debian.org/mopidy-team/mopidy-alsamixer","https://github.com/mopidy/mopidy-alsamixer",3286.4480439815,1,5,0,5,39,0,0,39,2,"2",1.83333333333333,2 -"mopidy-beets",-0.6046887672,2.3676499619,-1.3922973554,"https://salsa.debian.org/mopidy-team/mopidy-beets","https://github.com/mopidy/mopidy-beets",3887.5415162037,2,10,0,7,27,0,0,27,3,"3",1.83333333333333,2 -"mopidy-dleyna",-0.6150387258,1.8626619639,-1.276416264,"https://salsa.debian.org/mopidy-team/mopidy-dleyna","https://github.com/tkem/mopidy-dleyna.git",2554.9614351852,1,6,0,4,25,0,0,25,1,"1",1.85714285714286,2 -"mp3wrap",0.1511883249,2.4047625906,-0.4072551552,"https://github.com/marciosouza20/mp3wrap.git","https://github.com/marciosouza20/mp3wrap.git",36.6266319444,0,2,0,1,0,0,0,1,1,"1",2,1 -"mpc123",0.851583608,3.5692284528,-0.2366259159,"https://salsa.debian.org/debian/mpc123","https://github.com/bucciarati/mpc123",4095.7045717593,0,4,0,1,2,0,0,2,3,"3",2,2 -"mpdscribble",-0.7233101544,-0.5981438455,-0.7658816633,"https://salsa.debian.org/mpd-team/mpdscribble","https://github.com/MusicPlayerDaemon/mpdscribble.git",5474.3595486111,22,17,0,29,73,0,0,90,4,"4",1.43589743589744,1.81111111111111 -"mruby",-1.5514391,-1.3019492907,-1.6243857492,"https://github.com/mruby-debian/mruby","https://github.com/mruby-debian/mruby",4156.8421527778,37,353,0,255,2,0,32,288,3,"3",1.9051282051282,1.00694444444444 -"msgpuck",-1.9345101796,0.7538606408,-2.5762644187,"https://github.com/rtsisyk/msgpuck","https://github.com/rtsisyk/msgpuck",1946.1415046296,3,13,1,11,15,0,0,21,1,"1",1.8125,1.71428571428571 -"msitools",0.9685786476,3.4437444916,0.0488138918,"https://salsa.debian.org/debian/msitools","https://github.com/GNOME/msitools",4016.1692361111,45,59,0,69,4,0,0,71,3,"3",1.56730769230769,1.05633802816901 -"mt-st",0.1082142752,0.6983439611,-0.1608193497,"https://salsa.debian.org/debian/mt-st","https://github.com/iustin/mt-st",3093.7365972222,14,5,0,10,19,0,0,20,2,"2",1.26315789473684,1.95 -"mtpolicyd",-1.3311506647,1.0954039333,-1.9915905372,"https://salsa.debian.org/debian/mtpolicyd","https://github.com/benningm/mtpolicyd.git",2186.9926157407,1,4,0,3,21,0,0,21,1,"1",1.8,2 -"mtree-netbsd",-1.5216638363,0.5725600433,-2.0355608409,"https://github.com/jgoerzen/mtree-netbsd","https://github.com/jgoerzen/mtree-netbsd",1538.1956712963,1,7,0,0,1,0,0,1,1,"1",1.875,2 -"MU-CITE",-0.9256165282,0.9613021982,-1.3098678212,"https://salsa.debian.org/debian/mu-cite","https://github.com/cvs-m17n-org/MU-CITE",4190.5202430556,2,3,0,4,3,0,0,5,3,"3",1.6,1.6 -"mudita24",-0.0566417905,1.5271069455,-0.4568909604,"https://salsa.debian.org/multimedia-team/mudita24","https://github.com/NielsMayer/mudita24",2005.0215046296,0,5,0,2,9,0,0,11,1,"1",2,1.81818181818182 -"mugshot",0.7316630016,2.7960037279,-0.1554059373,"https://salsa.debian.org/python-team/packages/mugshot","https://github.com/bluesabre/mugshot",3560.1744907408,3,9,0,7,25,0,1,28,2,"2",1.75,1.89285714285714 -"mupen64plus-video-glide64",0.1160309114,2.3242018271,-0.3185351881,"https://salsa.debian.org/games-team/mupen64plus-video-glide64","https://github.com/mupen64plus/mupen64plus-video-glide64",4871.8438310185,2,17,0,10,7,0,0,11,3,"3",1.89473684210526,1.63636363636364 -"mupen64plus-video-z64",-0.0630178119,1.307530126,-0.3263531841,"https://salsa.debian.org/games-team/mupen64plus-video-z64","https://github.com/mupen64plus/mupen64plus-video-z64",4885.8515046296,2,17,0,10,9,0,0,12,3,"3",1.89473684210526,1.75 -"muse",0.9834892976,2.8604314623,0.0726359102,"https://salsa.debian.org/emacsen-team/muse-el","https://github.com/alexott/muse",5662.6274884259,5,7,0,9,14,0,0,76,4,"4",1.58333333333333,1.18421052631579 -"mwrap",-0.6055213344,1.7500683415,-1.3620779276,"https://salsa.debian.org/pkg-octave-team/mwrap","https://github.com/zgimbutas/mwrap",3042.6040856482,0,5,0,3,5,0,0,5,2,"2",2,2 -"nasty",1.7398622788,6.040628791,0.3559757417,"https://salsa.debian.org/pkg-security-team/nasty","https://github.com/folkertvanheusden/nasty",2093.1121412037,0,4,0,2,1,0,0,3,1,"1",2,1.33333333333333 -"natsort",0.2307395007,2.1095787345,-0.2397860986,"https://salsa.debian.org/python-team/packages/natsort","https://github.com/SethMMorton/natsort.git",4065.0547106482,9,17,0,19,20,0,1,38,3,"3",1.65384615384615,1.52631578947368 -"repairer",0.924989159,3.2280109324,0.0005519878,"https://salsa.debian.org/l10n-korean-team/nautilus-filename-repairer","https://github.com/choehwanjin/repairer",2878.1959953704,0,1,0,1,3,0,1,4,2,"2",2,1.75 -"nb2plots",-1.170670669,1.5589366654,-1.743374148,"https://salsa.debian.org/python-team/packages/nb2plots","https://github.com/matthew-brett/nb2plots.git",2904.4454282408,2,7,0,6,21,0,0,22,2,"2",1.77777777777778,1.95454545454545 -"nbtscan",0.2989992596,1.090810849,-0.0722586258,"https://salsa.debian.org/pkg-security-team/nbtscan","https://github.com/resurrecting-open-source-projects/nbtscan",1167.6364699074,1,3,0,3,5,0,0,5,1,"1",1.75,2 -"ncbi-vdb",-0.6569361569,-0.2675890873,-0.7753516055,"https://salsa.debian.org/med-team/ncbi-vdb","https://github.com/ncbi/ncbi-vdb",3367.922349537,2,70,0,18,30,0,5,46,2,"2",1.97222222222222,1.65217391304348 -"ncompress",0.6360276236,1.8663344659,0.0985497423,"https://salsa.debian.org/debian/ncompress","https://github.com/vapier/ncompress.git",4740.1165856482,11,4,0,11,22,0,0,23,3,"3",1.26666666666667,1.95652173913043 -"ndctl",-0.3026771532,0.473161469,-0.4939488737,"https://github.com/kilobyte/ndctl/tree/debian","https://github.com/kilobyte/ndctl",3210.1365509259,74,5,0,51,3,0,0,54,2,"2",1.06329113924051,1.05555555555556 -"ndg_httpsclient",0.1546655272,1.0783288299,-0.0773848973,"https://salsa.debian.org/debian/ndg-httpsclient","https://github.com/cedadev/ndg_httpsclient",3360.0136342593,2,11,0,6,22,0,0,22,2,"2",1.84615384615385,2 -"neard-deb",0.5311444679,4.0953604611,-0.5296646663,"https://github.com/sameo/neard-deb","https://github.com/sameo/neard-deb",1126.7503587963,0,4,0,2,2,0,0,2,1,"1",2,2 -"neartree",-0.0269486668,2.399314564,-0.5366245779,"https://salsa.debian.org/science-team/neartree","https://github.com/yayahjb/neartree",4773.070625,0,3,0,2,2,0,0,3,3,"3",2,1.66666666666667 -"neko-debian",-0.3476116673,0.4024674223,-0.6520598063,"https://github.com/HaxeFoundation/neko-debian","https://github.com/HaxeFoundation/neko-debian",5577.6636111111,6,3,0,5,2,0,0,7,4,"4",1.33333333333333,1.28571428571429 -"neomutt",1.0660685693,2.7351403402,0.2935299788,"https://salsa.debian.org/mutt-team/neomutt","https://github.com/neomutt/neomutt",5650.5290625,268,117,0,322,9,0,0,326,4,"4",1.3038961038961,1.02760736196319 -"netconsole",-1.2200873308,0.812746843,-1.6449255455,"https://salsa.debian.org/debian/netconsole","https://github.com/ionos-cloud/netconsole",558.8093865741,0,1,0,1,2,0,0,2,1,"1",2,2 -"nfoview",-0.0498945429,1.6663964244,-0.6736195708,"https://salsa.debian.org/python-team/packages/nfoview","https://github.com/otsaloma/nfoview",5657.3754861111,14,5,0,10,8,0,0,13,4,"4",1.26315789473684,1.61538461538462 -"nfstrace",0.7169141553,2.6489983997,-0.0935466194,"https://salsa.debian.org/debian/nfstrace","https://github.com/epam/nfstrace",2137.7810300926,9,42,0,16,32,0,0,38,1,"1",1.82352941176471,1.84210526315789 -"nifti2dicom",-0.1186607259,1.299142347,-0.6903266138,"https://salsa.debian.org/med-team/nifti2dicom","https://github.com/biolab-unige/nifti2dicom.git",2963.0766898148,0,2,0,2,17,0,0,17,2,"2",2,2 -"ninka",-1.2427926984,1.0338618531,-1.6842246523,"https://salsa.debian.org/debian/ninka","https://github.com/dmgerman/ninka",4166.3812268519,0,17,0,10,27,0,0,27,3,"3",2,2 -"nload",0.6920286572,1.9662038736,0.1248983732,"https://github.com/marciosouza20/nload.git","https://github.com/marciosouza20/nload.git",5.8634143519,0,1,0,1,0,0,0,1,1,"1",2,1 -"nm-tray",0.2402419984,2.9899186351,-0.4509695416,"https://salsa.debian.org/lxqt-team/nm-tray","https://github.com/palinek/nm-tray.git",2973.3749074074,57,7,0,43,49,0,0,80,2,"2",1.109375,1.6125 -"nocache",0.6323720855,2.8803006592,-0.068529056,"https://salsa.debian.org/debian/nocache","https://github.com/Feh/nocache",3331.9030902778,2,12,0,11,42,0,0,42,2,"2",1.85714285714286,2 -"nodau",-1.5991809833,-0.3805538345,-1.905798655,"https://salsa.debian.org/carnil/nodau","https://github.com/TicklishHoneyBee/nodau",4073.1802662037,2,7,0,3,6,0,0,6,3,"3",1.77777777777778,2 -"abbrev-js",0.3167225092,2.5424116289,-0.1165089261,"https://salsa.debian.org/js-team/node-abbrev","https://github.com/npm/abbrev-js",5021.0522106482,6,4,0,8,4,0,0,12,4,"4",1.4,1.33333333333333 -"node-active-x-obfuscator",-1.7102077451,0.4939822957,-2.1488227767,"https://salsa.debian.org/js-team/node-active-x-obfuscator","https://github.com/felixge/node-active-x-obfuscator.git",979.9255902778,0,5,0,3,0,0,0,3,1,"1",2,1 -"address",-2.3512829732,-0.2296492891,-2.7851879565,"https://salsa.debian.org/js-team/node-address","https://github.com/node-modules/address.git",3756.5830208333,7,6,0,10,40,0,0,41,2,"2",1.46153846153846,1.97560975609756 -"ansi.js",0.651738311,3.3801423506,-0.0622958722,"https://salsa.debian.org/js-team/node-ansi","https://github.com/TooTallNate/ansi.js.git",2003.1949884259,2,6,0,6,9,0,0,13,1,"1",1.75,1.69230769230769 -"applause",-2.6025031313,0.0354812349,-3.2768862018,"https://salsa.debian.org/js-team/node-applause","https://github.com/outatime/applause.git",2600.1592592593,1,6,0,4,30,0,0,30,1,"1",1.85714285714286,2 -"node-cross-spawn-async",-0.4789307226,0.5287764974,-0.6568563161,"https://salsa.debian.org/js-team/node-cross-spawn-async","https://github.com/IndigoUnited/node-cross-spawn-async.git",674.7693981481,1,12,0,8,0,0,0,8,1,"1",1.92307692307692,1 -"CSSStyleDeclaration",0.0239557668,3.7882296404,-1.1998721983,"https://salsa.debian.org/js-team/node-cssstyle","https://github.com/chad3814/CSSStyleDeclaration.git",2137.4537037037,0,9,0,5,0,0,0,5,1,"1",2,1 -"d3-color",-0.5677058758,2.345342576,-1.264606113,"https://salsa.debian.org/js-team/node-d3-color","https://github.com/d3/d3-color",3047.9240046296,6,8,0,11,41,0,0,44,2,"2",1.57142857142857,1.93181818181818 -"node-dashdash",0.812623388,3.8026107021,-0.0104465219,"https://salsa.debian.org/js-team/node-dashdash","https://github.com/trentm/node-dashdash",3657.7330671296,5,4,0,5,28,0,0,28,2,"2",1.44444444444444,2 -"node-deep-extend",0.3074384175,2.5963720517,-0.1256934881,"https://salsa.debian.org/js-team/node-deep-extend","https://github.com/unclechu/node-deep-extend.git",2469.0779513889,2,14,0,9,1,0,0,9,1,"1",1.875,1.11111111111111 -"dryice",-1.6777851216,0.5009822025,-2.1440213388,"https://salsa.debian.org/js-team/node-dryice","https://github.com/mozilla/dryice",1261.6348842593,1,13,0,12,13,0,0,17,1,"1",1.92857142857143,1.76470588235294 -"node-errno",0.7419951798,3.986012183,-0.0698570252,"https://salsa.debian.org/js-team/node-errno","https://github.com/rvagg/node-errno",3152.3664699074,3,11,0,11,31,0,0,31,2,"2",1.78571428571429,2 -"node-error-ex",-0.1994307651,1.9233568792,-0.6268261848,"https://salsa.debian.org/js-team/node-error-ex","https://github.com/qix-/node-error-ex.git",1448.5513425926,4,8,0,5,25,0,0,25,1,"1",1.66666666666667,2 -"node-extend",0.7004129328,3.6122581892,-0.0527431497,"https://salsa.debian.org/js-team/node-extend","https://github.com/justmoon/node-extend",4212.296400463,1,15,0,13,1,0,0,13,3,"3",1.9375,1.07692307692308 -"extend-shallow",-0.1006921362,1.3927484709,-0.3636715364,"https://salsa.debian.org/js-team/node-extend-shallow","https://github.com/jonschlinkert/extend-shallow",1170.6065046296,0,5,0,3,4,0,0,4,1,"1",2,2 -"file-entry-cache",-0.7855336157,1.967354907,-1.5011474598,"https://salsa.debian.org/js-team/node-file-entry-cache","https://github.com/royriojas/file-entry-cache.git",3181.5545138889,1,11,0,7,28,0,0,28,2,"2",1.91666666666667,2 -"node-findit",-0.2051260072,2.7355493581,-1.1209208962,"https://salsa.debian.org/js-team/node-findit2","https://github.com/andrewrk/node-findit.git",1811.4445601852,1,5,0,4,4,0,0,6,1,"1",1.83333333333333,1.66666666666667 -"fined",-0.1637425394,2.1242452034,-0.5982871995,"https://salsa.debian.org/js-team/node-fined","https://github.com/js-cli/fined",1982.8433680556,5,3,0,4,10,0,0,10,1,"1",1.375,2 -"node-form-data",0.5074076179,3.0343874901,-0.0886742861,"https://salsa.debian.org/js-team/node-form-data","https://github.com/felixge/node-form-data.git",3563.1111111111,9,36,0,35,5,0,0,36,2,"2",1.8,1.13888888888889 -"node-fresh",-0.3450557311,2.0039913503,-0.81124946,"https://salsa.debian.org/js-team/node-fresh","https://github.com/visionmedia/node-fresh.git",3886.7925231482,11,3,0,12,37,0,0,37,3,"3",1.21428571428571,2 -"is-npm",0.9785051776,4.5008052167,0.0095997285,"https://salsa.debian.org/js-team/node-is-npm","https://github.com/sindresorhus/is-npm",2619.0418634259,7,2,0,7,17,0,0,17,1,"1",1.22222222222222,2 -"is-typedarray",0.3980978816,2.528720541,-0.0976776715,"https://salsa.debian.org/js-team/node-is-typedarray","https://github.com/hughsk/is-typedarray",349.2442476852,0,2,0,2,14,0,0,14,1,"1",2,2 -"isexe",0.3099265646,2.6155667478,-0.1218258686,"https://salsa.debian.org/js-team/node-isexe","https://github.com/isaacs/isexe",2832.2716319445,1,4,0,1,26,0,0,26,2,"2",1.8,2 -"Jed",0.9307464408,4.5334423493,-0.0663016053,"https://salsa.debian.org/js-team/node-jed","https://github.com/messageformat/Jed.git",1857.5029166667,3,19,0,18,61,0,0,61,1,"1",1.86363636363636,2 -"jsesc",0.1478102512,3.2506359357,-0.5098361018,"https://salsa.debian.org/js-team/node-jsesc","https://github.com/mathiasbynens/jsesc",2702.1588310185,6,3,0,8,44,0,0,44,1,"1",1.33333333333333,2 -"JSON.minify",-0.1691871793,2.0408856828,-0.6162694158,"https://salsa.debian.org/js-team/node-jsonminify","https://github.com/fkei/JSON.minify",3001.0353819445,2,9,0,8,17,0,0,18,2,"2",1.81818181818182,1.94444444444444 -"JSONSelect",0.5601821689,4.3158830877,-0.4551619485,"https://salsa.debian.org/js-team/node-jsonselect","https://github.com/lloyd/JSONSelect",984.9768287037,2,8,0,8,38,0,0,39,1,"1",1.8,1.97435897435897 -"knockout",-1.6817262176,0.9748888004,-2.3144504112,"https://salsa.debian.org/js-team/node-knockout","https://github.com/knockout/knockout.git",4081.7972685185,20,115,0,81,45,0,125,241,3,"3",1.85185185185185,1.18672199170124 -"lastfm-node",-0.2802502576,3.2316861272,-1.2092934746,"https://salsa.debian.org/js-team/node-lastfm","https://github.com/jammus/lastfm-node",4644.4506018519,2,11,2,9,28,0,0,28,3,"3",1.84615384615385,2 -"node-macaddress",-2.3578089542,0.3286344876,-2.9837856086,"https://salsa.debian.org/js-team/node-macaddress","https://github.com/scravy/node-macaddress",2961.7712268519,5,13,0,12,73,0,0,73,2,"2",1.72222222222222,2 -"map-visit",0.0602654466,2.3400984295,-0.3823836028,"https://salsa.debian.org/js-team/node-map-visit","https://github.com/jonschlinkert/map-visit",645.0525115741,0,3,0,2,3,0,0,4,1,"1",2,1.75 -"media-typer",-0.1314554385,2.3567183276,-0.7554351148,"https://salsa.debian.org/js-team/node-media-typer","https://github.com/expressjs/media-typer.git",2488.2450925926,1,1,0,2,14,0,0,14,1,"1",1.5,2 -"merge-descriptors",-0.2368061411,2.2901222412,-0.8069774958,"https://salsa.debian.org/js-team/node-merge-descriptors","https://github.com/component/merge-descriptors.git",3669.9310532407,3,3,0,6,17,0,0,17,2,"2",1.5,2 -"node-mess",-0.2872327671,3.3046798368,-1.2179833072,"https://salsa.debian.org/js-team/node-mess","https://github.com/bobrik/node-mess",420.8625578704,0,3,0,2,2,0,0,2,1,"1",2,2 -"minimist",0.3063916948,2.5263654362,-0.1223643827,"https://salsa.debian.org/js-team/node-minimist","https://github.com/minimistjs/minimist.git",3791.1307175926,12,9,0,15,32,0,0,43,3,"3",1.42857142857143,1.74418604651163 -"mixin-deep",0.2041015905,2.301231867,-0.3460970033,"https://salsa.debian.org/js-team/node-mixin-deep","https://github.com/jonschlinkert/mixin-deep.git",1736.2018171296,0,4,0,2,14,0,0,14,1,"1",2,2 -"node-mocks-http",-1.7138454453,1.129012054,-2.4238704392,"https://salsa.debian.org/js-team/node-mocks-http","https://github.com/howardabrams/node-mocks-http",4315.2549074074,38,62,0,71,2,0,0,72,3,"3",1.62,1.02777777777778 -"repeat-element",0.0303018925,2.2050520215,-0.399164761,"https://salsa.debian.org/js-team/node-repeat-element","https://github.com/jonschlinkert/repeat-element",2277.9809027778,1,7,0,3,6,0,0,6,1,"1",1.875,2 -"semver-diff",0.3257088663,2.53870067,-0.1250464411,"https://salsa.debian.org/js-team/node-semver-diff","https://github.com/sindresorhus/semver-diff",2556.954525463,4,3,0,6,11,0,0,11,1,"1",1.42857142857143,2 -"node-simple-swizzle",-3.3828108141,-1.5319435267,-3.7510526278,"https://salsa.debian.org/js-team/node-simple-swizzle","https://github.com/qix-/node-simple-swizzle",2271.2482060185,1,3,0,1,3,0,0,3,1,"1",1.75,2 -"snapdragon",0.0374783954,2.1244720905,-0.3853126603,"https://salsa.debian.org/js-team/node-snapdragon","https://github.com/jonschlinkert/snapdragon.git",2160.5059722222,3,7,0,4,43,0,0,43,1,"1",1.7,2 -"ssri",0.4331740134,2.8578668337,-0.1107367526,"https://salsa.debian.org/js-team/node-ssri","https://github.com/zkat/ssri.git",2084.4809606482,2,3,0,2,27,0,0,27,1,"1",1.6,2 -"starttls",-3.2028271629,0.3123776454,-4.1656333947,"https://salsa.debian.org/js-team/node-starttls","https://github.com/mattcg/starttls",960.3696643519,0,1,0,1,4,0,0,4,1,"1",2,2 -"string_decoder",0.4324513521,3.0006538783,-0.1138855604,"https://salsa.debian.org/js-team/node-string-decoder","https://github.com/nodejs/string_decoder.git",2072.5483449074,4,7,0,8,9,0,0,12,1,"1",1.63636363636364,1.75 -"test-commonjs",-1.1865527924,1.2057642216,-1.6221327583,"https://salsa.debian.org/js-team/node-test","https://github.com/Gozala/test-commonjs",826.1617476852,0,3,0,1,16,0,0,16,1,"1",2,2 -"timed-out",0.534083437,2.8184506266,-0.0696353825,"https://salsa.debian.org/js-team/node-timed-out","https://github.com/floatdrop/timed-out",2343.4748726852,6,7,0,8,28,0,0,28,1,"1",1.53846153846154,2 -"nodeenv",-0.6570648957,1.4812327857,-1.14641203,"https://github.com/chriskuehl/nodeenv","https://github.com/chriskuehl/nodeenv",2128.7291782408,1,53,0,38,2,0,0,40,1,"1",1.98148148148148,1.05 -"nomacs",-0.1195252619,0.4799728253,-0.3176324087,"https://salsa.debian.org/lxqt-team/nomacs","https://github.com/nomacs/nomacs/commits/master",5185.326875,55,11,0,0,0,0,0,0,4,"4",1.16666666666667,NA -"nomnom",0.4452914343,2.9402706663,-0.3322295975,"https://github.com/mogaal/nomnom","https://github.com/mogaal/nomnom",917.9151273148,0,2,0,1,0,0,0,1,1,"1",2,1 -"nordlicht",-0.4190840106,1.2017878417,-0.7274544195,"https://salsa.debian.org/multimedia-team/nordlicht","https://github.com/nordlicht/nordlicht",1854.1766087963,0,8,0,6,13,0,0,13,1,"1",2,2 -"norm",0.0395894571,0.5725879857,-0.0372679262,"https://salsa.debian.org/debian/norm","https://github.com/USNavalResearchLaboratory/norm",1453.1532523148,10,9,0,11,11,0,1,19,1,"1",1.47368421052632,1.57894736842105 -"notmuch-addrlookup-c",-0.5765143279,1.1877508137,-1.0148913081,"https://salsa.debian.org/debian/notmuch-addrlookup","https://github.com/aperezdc/notmuch-addrlookup-c",3177.0368287037,9,8,0,14,28,0,0,28,2,"2",1.47058823529412,2 -"nsca-ng",-0.5633658512,0.8404353755,-1.1288671432,"https://salsa.debian.org/nagios-team/nsca-ng","https://github.com/weiss/nsca-ng.git",3817.9714236111,3,6,0,5,6,0,0,9,3,"3",1.66666666666667,1.66666666666667 -"nsnake.debian",0.294306693,3.1180145865,-0.512619257,"https://github.com/alexdantas/nsnake.debian","https://github.com/alexdantas/nsnake.debian",35.0934490741,0,2,0,0,1,0,0,1,1,"1",2,2 -"nsntrace",-0.2107095266,2.4855302503,-1.1430329763,"https://salsa.debian.org/sudip/nsntrace","https://github.com/nsntrace/nsntrace",1665.640150463,1,7,0,6,21,0,0,21,1,"1",1.875,2 -"nss-passwords",0.7982881531,3.7262660831,-0.2843886787,"https://salsa.debian.org/ocaml-team/nss-passwords","https://github.com/glondu/nss-passwords",4767.9518865741,1,2,0,2,4,0,0,5,3,"3",1.66666666666667,1.8 -"nulib2",-2.8835281311,-0.617225292,-3.3218622057,"https://salsa.debian.org/debian/nulib2","https://github.com/fadden/nulib2.git",2958.8671643519,0,7,0,4,9,0,0,9,2,"2",2,2 -"nuntius-linux",0.0562256061,3.0068525021,-0.7578958074,"https://salsa.debian.org/debian/nuntius-linux","https://github.com/holylobster/nuntius-linux.git",1285.1505324074,2,13,0,13,70,0,0,71,1,"1",1.86666666666667,1.98591549295775 -"nurpawiki",-4.202425836,-3.4681724303,-4.3504039812,"https://salsa.debian.org/ocaml-team/nurpawiki","https://github.com/glondu/nurpawiki.git",5643.4121296296,0,6,0,2,2,0,0,2,4,"4",2,2 -"nvidia-modprobe",0.5457409995,2.6334328552,-0.0334171669,"https://salsa.debian.org/nvidia-team/nvidia-modprobe","https://github.com/NVIDIA/nvidia-modprobe",3894.0040972222,0,3,0,3,7,0,0,9,3,"3",2,1.77777777777778 -"nvidia-persistenced",0.5544050718,2.8521283153,-0.0537008341,"https://salsa.debian.org/nvidia-team/nvidia-persistenced","https://github.com/NVIDIA/nvidia-persistenced",3871.0209606482,0,3,0,3,13,0,0,15,3,"3",2,1.86666666666667 -"nvidia-settings",0.3151479615,2.7684405123,-0.2288499596,"https://salsa.debian.org/nvidia-team/nvidia-settings","https://github.com/NVIDIA/nvidia-settings",5776.4649305556,24,5,0,16,143,0,0,150,4,"4",1.17241379310345,1.95333333333333 -"ocaml-ffmpeg",-1.7680324626,0.6213946308,-2.2379595426,"https://salsa.debian.org/ocaml-team/ocaml-ffmpeg","https://github.com/savonet/ocaml-ffmpeg.git",4033.3768634259,2,11,0,7,20,0,0,21,3,"3",1.84615384615385,1.95238095238095 -"ocaml-fileutils",-1.2078611318,0.0677154031,-1.4595756972,"https://salsa.debian.org/ocaml-team/ocaml-fileutils","https://github.com/gildor478/ocaml-fileutils.git",1144.3784027778,5,6,0,7,12,0,0,12,1,"1",1.54545454545455,2 -"ocaml-flac",-1.7507623662,-0.3502245327,-2.1890215844,"https://salsa.debian.org/ocaml-team/ocaml-flac","https://github.com/savonet/ocaml-flac.git",4915.2796990741,1,7,0,5,12,0,0,14,3,"3",1.875,1.85714285714286 -"gen",-2.9140964642,-0.9922910043,-3.3171869681,"https://salsa.debian.org/ocaml-team/ocaml-gen","https://github.com/c-cube/gen.git",3422.9857291667,3,9,0,7,18,0,0,18,2,"2",1.75,2 -"ocaml-gstreamer",-0.175799754,2.6087723309,-0.9430825776,"https://salsa.debian.org/ocaml-team/ocaml-gstreamer","https://github.com/savonet/ocaml-gstreamer.git",5244.7535532407,0,10,0,5,5,0,0,7,4,"4",2,1.71428571428571 -"ocaml-http",-1.5494605128,1.5864107076,-2.4465473259,"https://salsa.debian.org/ocaml-team/ocaml-http","https://github.com/sacerdot/ocaml-http.git",3570.2121180556,1,3,0,2,0,0,0,2,2,"2",1.75,1 -"ocaml-inotify",-1.5984447381,0.206726916,-1.9785130273,"https://salsa.debian.org/ocaml-team/ocaml-inotify","https://github.com/whitequark/ocaml-inotify",3586.2803240741,4,14,0,12,18,0,0,19,2,"2",1.77777777777778,1.94736842105263 -"ocaml-ladspa",-0.7118657078,1.2358767302,-1.4392313232,"https://salsa.debian.org/ocaml-team/ocaml-ladspa","https://github.com/savonet/ocaml-ladspa.git",4935.8736458333,1,7,0,4,4,0,0,6,3,"3",1.875,1.66666666666667 -"ocaml-ogg",-0.348620776,1.64371205,-0.9603602503,"https://salsa.debian.org/ocaml-team/ocaml-ogg","https://github.com/savonet/ocaml-ogg.git",5318.8518402778,1,7,0,4,2,0,0,4,4,"4",1.875,1.5 -"ocaml-opus",-0.9457632068,1.3513638625,-1.5381035109,"https://salsa.debian.org/ocaml-team/ocaml-opus","https://github.com/savonet/ocaml-opus.git",3889.1978819445,2,8,0,5,6,0,0,7,3,"3",1.8,1.85714285714286 -"res",-1.6619256072,0.8404387726,-2.374669465,"https://salsa.debian.org/ocaml-team/ocaml-res","https://github.com/mmottl/res",3234.9244791667,0,3,0,2,6,0,0,6,2,"2",2,2 -"ocaml-sha",-2.1615777656,-1.5624804098,-2.2474510973,"https://salsa.debian.org/ocaml-team/ocaml-sha","https://github.com/djs55/ocaml-sha.git",5351.1972453704,6,17,0,13,26,0,0,27,4,"4",1.73913043478261,1.96296296296296 -"ocaml-shine",-1.6537337701,1.6212733101,-2.5015175014,"https://salsa.debian.org/ocaml-team/ocaml-shine","https://github.com/savonet/ocaml-shine.git",3549.8277199074,1,5,0,4,3,0,0,5,2,"2",1.83333333333333,1.6 -"ocaml-speex",-0.6153846806,3.1543840863,-1.9637699192,"https://salsa.debian.org/ocaml-team/ocaml-speex","https://github.com/savonet/ocaml-speex.git",5316.9980902778,1,7,0,4,2,0,0,4,4,"4",1.875,1.5 -"ocaml-ssl",1.2627219166,4.0685720227,0.1401679649,"https://salsa.debian.org/ocaml-team/ocaml-ssl","https://github.com/savonet/ocaml-ssl.git",5405.4381828704,11,30,0,25,0,0,0,25,4,"4",1.73170731707317,1 -"ocaml-theora",-0.2512292534,3.1544360643,-1.4728171897,"https://salsa.debian.org/ocaml-team/ocaml-theora","https://github.com/savonet/ocaml-theora.git",5316.9970717593,1,8,0,4,1,0,0,4,4,"4",1.88888888888889,1.25 -"ocaml-usb",-0.5973686893,1.7793339383,-1.206091524,"https://salsa.debian.org/ocaml-team/ocaml-usb","https://github.com/letoh/ocaml-usb.git",4549.6073263889,1,8,0,5,8,0,0,10,3,"3",1.88888888888889,1.8 -"ocaml-vorbis",-0.9822001321,0.9986914273,-1.5520563192,"https://salsa.debian.org/ocaml-team/ocaml-vorbis","https://github.com/savonet/ocaml-vorbis.git",5459.5669675926,1,7,0,4,3,0,0,6,4,"4",1.875,1.5 -"ocamlagrep",-2.1652077496,-1.0121628969,-2.3572482465,"https://salsa.debian.org/ocaml-team/ocamlagrep","https://github.com/xavierleroy/ocamlagrep",2115.1310300926,1,2,0,2,4,0,0,4,1,"1",1.66666666666667,2 -"gsl-ocaml",0.1216448812,1.0155865797,-0.2462866522,"https://salsa.debian.org/ocaml-team/ocamlgsl","https://github.com/mmottl/gsl-ocaml.git",3442.6045023148,1,11,0,10,21,0,0,22,2,"2",1.91666666666667,1.95454545454545 -"ocaml-makefile",-0.4214445039,1.3411395826,-0.7864395598,"https://salsa.debian.org/ocaml-team/ocamlmakefile","https://github.com/mmottl/ocaml-makefile.git",1922.9826967593,0,4,0,2,8,0,0,8,1,"1",2,2 -"ocl-icd",0.2781454411,0.8515664588,0.03306071,"https://salsa.debian.org/opencl-team/ocl-icd","https://github.com/OCL-DEV/ocl-icd.git",4207.2761689815,2,15,0,5,27,0,0,28,3,"3",1.88235294117647,1.96428571428571 -"octave-mpi",-0.032052781,2.1492331512,-0.6364834294,"https://salsa.debian.org/pkg-octave-team/octave-mpi","https://github.com/carlodefalco/octave-mpi",1390.161724537,1,3,0,1,6,0,0,6,1,"1",1.75,2 -"odil",-0.8317789828,-0.397569442,-0.9351734244,"https://salsa.debian.org/med-team/odil","https://github.com/lamyj/odil",2678.1739351852,5,12,1,9,15,0,1,16,1,"1",1.70588235294118,1.9375 -"odt2txt",0.9552454239,3.2643599868,0.0923391006,"https://salsa.debian.org/debian/odt2txt","https://github.com/dstosberg/odt2txt",3417.1558564815,1,9,0,5,28,0,0,28,2,"2",1.9,2 -"ofxstatement",-0.8387724027,1.4898616569,-1.2924218148,"https://github.com/gerasiov/ofxstatement","https://github.com/gerasiov/ofxstatement",1632.6686689815,1,16,0,11,3,0,0,13,1,"1",1.94117647058824,1.23076923076923 -"ofxstatement-plugins",-0.5554916063,2.2730604682,-1.2542888677,"https://github.com/gerasiov/ofxstatement-plugins","https://github.com/gerasiov/ofxstatement-plugins",1689.0224305556,0,3,0,1,0,0,0,1,1,"1",2,1 -"ogdi",0.4637866222,1.3827381608,0.0703190227,"https://salsa.debian.org/debian-gis-team/ogdi-dfsg","https://github.com/libogdi/ogdi.git",5366.5318402778,1,9,0,9,11,0,0,13,4,"4",1.9,1.84615384615385 -"onesixtyone",-0.0525705364,1.7993576972,-0.4404876155,"https://salsa.debian.org/pkg-security-team/onesixtyone","https://github.com/trailofbits/onesixtyone",3350.0547222222,10,11,0,15,26,0,0,27,2,"2",1.52380952380952,1.96296296296296 -"onionbalance",-1.7072197089,-0.2953383489,-2.1044905747,"https://salsa.debian.org/debian/onionbalance","https://github.com/asn-d6/onionbalance.git",3123.2153240741,16,8,0,18,1,0,0,19,2,"2",1.33333333333333,1.05263157894737 -"Sensor",-0.705184402,0.5021820033,-0.967790767,"https://salsa.debian.org/multimedia-team/openni-sensor-primesense","https://github.com/PrimeSense/Sensor.git",1069.8803587963,0,3,0,3,28,0,1,31,1,"1",2,1.90322580645161 -"opensysusers",-3.3096631827,-1.1081118835,-3.751144934,"https://salsa.debian.org/debian/opensysusers","https://github.com/cromerc/opensysusers.git",1929.9289236111,4,11,0,5,2,0,0,5,1,"1",1.73333333333333,1.4 -"OpenMSX",0.5832066024,3.2825027954,-0.1430416611,"https://salsa.debian.org/openttd-team/openttd-openmsx","https://github.com/OpenTTD/OpenMSX.git",5037.8726041667,7,8,0,10,18,0,0,19,4,"4",1.53333333333333,1.94736842105263 -"OpenSFX",0.0341113683,1.8104216829,-0.3723043838,"https://salsa.debian.org/openttd-team/openttd-opensfx","https://github.com/OpenTTD/OpenSFX.git",5073.9709953704,7,9,0,10,14,0,0,15,4,"4",1.5625,1.93333333333333 -"opentyrian",-0.4709020515,1.8128682506,-0.9006361349,"https://salsa.debian.org/games-team/opentyrian","https://github.com/opentyrian/opentyrian.git",5445.2196527778,6,17,0,14,49,0,1,54,4,"4",1.73913043478261,1.90740740740741 -"platform",0.4510883183,2.2604153125,-0.0788317433,"https://salsa.debian.org/debian/p8-platform","https://github.com/Pulse-Eight/platform.git",2947.3549768519,2,28,0,23,43,0,0,48,2,"2",1.93333333333333,1.89583333333333 -"pacemaker",1.1235155799,1.8849677755,0.6240113585,"https://salsa.debian.org/ha-team/pacemaker","https://github.com/ClusterLabs/pacemaker",5780.1951388889,21,156,0,106,3,0,0,107,4,"4",1.88135593220339,1.02803738317757 -"packit",1.4894283431,3.9572075631,0.3794626915,"https://salsa.debian.org/debian/packit","https://github.com/resurrecting-open-source-projects/packit",2522.8474189815,3,11,0,6,11,0,0,11,1,"1",1.78571428571429,2 -"pacman4console.debian",0.7320531649,3.0292005631,-0.1602141611,"https://github.com/alexdantas/pacman4console.debian","https://github.com/alexdantas/pacman4console.debian",442.2178819444,0,2,0,2,1,0,0,3,1,"1",2,1.33333333333333 -"padthv1",-0.0637358518,2.799184112,-0.6752002578,"https://salsa.debian.org/multimedia-team/padthv1","https://github.com/rncbc/padthv1.git",2334.0719907407,2,4,0,3,6,0,0,6,1,"1",1.66666666666667,2 -"pajeng",-2.2918945291,-1.4246521723,-2.5749097918,"https://salsa.debian.org/debian/pajeng","https://github.com/schnorr/pajeng.git",3890.9853472222,1,24,0,10,19,0,5,24,3,"3",1.96,1.79166666666667 -"pam_p11",-0.5485831615,0.9644461867,-1.1064659619,"https://salsa.debian.org/opensc-team/pam-p11","https://github.com/OpenSC/pam_p11.git",5663.1348842593,3,10,0,11,24,0,0,25,4,"4",1.76923076923077,1.96 -"ParaFly",-0.7037850797,1.1831572633,-1.0930849211,"https://salsa.debian.org/med-team/parafly","https://github.com/ParaFly/ParaFly",1437.0966666667,1,4,0,2,1,0,0,3,1,"1",1.8,1.33333333333333 -"parallax",-0.0887932063,2.3891626891,-0.651790374,"https://salsa.debian.org/python-team/packages/parallax","https://github.com/krig/parallax",5166.3950231482,4,10,0,8,6,0,0,9,4,"4",1.71428571428571,1.66666666666667 -"partd",0.2096153056,2.6193211803,-0.3193732736,"https://salsa.debian.org/python-team/packages/partd","https://github.com/dask/partd.git",3130.7778009259,14,10,0,21,46,0,0,46,2,"2",1.41666666666667,2 -"pass-extension-tail",-0.3578050897,2.1366716684,-0.9333806276,"https://salsa.debian.org/debian/pass-extension-tail","https://github.com/palortoff/pass-extension-tail",1892.8072222222,4,2,0,5,18,0,0,18,1,"1",1.33333333333333,2 -"pastedeploy",0.1590091885,1.1475071601,-0.1727660592,"https://salsa.debian.org/python-team/packages/pastedeploy","https://github.com/Pylons/pastedeploy",4320.1172453704,5,24,0,21,22,0,0,33,3,"3",1.82758620689655,1.66666666666667 -"pastescript",0.3538232706,1.3551325439,-0.0943410822,"https://salsa.debian.org/python-team/packages/pastescript","https://github.com/cdent/pastescript.git",3347.9577893519,0,24,0,14,7,0,0,18,2,"2",2,1.38888888888889 -"libdir",-0.0254803142,1.5396086069,-0.4343390486,"https://salsa.debian.org/multimedia-team/pd/pd-libdir","https://github.com/pure-data/libdir",2709.9478356482,1,9,0,3,1,0,0,3,1,"1",1.9,1.33333333333333 -"pd-lua",-0.3693835135,1.759056146,-0.7808199336,"https://salsa.debian.org/multimedia-team/pd/pd-lua","https://github.com/agraef/pd-lua.git",3302.6912962963,1,8,0,6,12,0,0,12,2,"2",1.88888888888889,2 -"moonlib",-0.2205765237,2.0226305482,-0.7345172583,"https://salsa.debian.org/multimedia-team/pd/pd-moonlib","https://github.com/MetaluNet/moonlib.git",5328.8024537037,1,11,0,4,15,0,0,15,4,"4",1.91666666666667,2 -"PuRestJson",-0.254922487,2.320237042,-0.8198404593,"https://salsa.debian.org/multimedia-team/pd/pd-purest-json","https://github.com/residuum/PuRestJson.git",4472.3532291667,0,8,0,5,24,0,2,26,3,"3",2,1.92307692307692 -"tclpd",-0.5472322751,1.0653891207,-0.8320989326,"https://salsa.debian.org/multimedia-team/pd/pd-tclpd","https://github.com/pd-externals/tclpd.git",5367.8831018519,2,12,0,3,0,0,0,3,4,"4",1.85714285714286,1 -"vbap",-0.2128975248,1.7544581087,-0.7432504363,"https://salsa.debian.org/multimedia-team/pd/pd-vbap","https://github.com/pd-externals/vbap.git",5156.0736574074,1,7,0,2,5,0,0,5,4,"4",1.875,2 -"xsample",-0.3812603066,1.9525555214,-0.8681596425,"https://salsa.debian.org/multimedia-team/pd/pd-xsample","https://github.com/grrrr/xsample.git",5672.9809259259,1,13,0,6,6,0,0,9,4,"4",1.92857142857143,1.66666666666667 -"pdd",-0.9684689619,1.3033133236,-1.4106955016,"https://salsa.debian.org/debian/pdd","https://github.com/jarun/pdd.git",2233.8472337963,8,9,0,11,23,0,0,23,1,"1",1.52941176470588,2 -"pdfresurrect",-0.2399652539,1.6794626137,-0.5968823707,"https://salsa.debian.org/debian/pdfresurrect","https://github.com/enferex/pdfresurrect.git",5171.962662037,2,6,0,6,19,0,0,19,4,"4",1.75,2 -"pkg-pdudaemon",-2.9130668064,-0.1458508245,-3.6790610276,"https://github.com/pdudaemon/pkg-pdudaemon","https://github.com/pdudaemon/pkg-pdudaemon",1898.0415972222,9,22,0,16,6,0,0,19,1,"1",1.70967741935484,1.31578947368421 -"peony-extensions",-0.5641116061,1.8659191557,-1.1878043816,"https://github.com/ukui/peony-extensions","https://github.com/ukui/peony-extensions",1664.9383333333,13,33,0,17,25,0,0,31,1,"1",1.71739130434783,1.80645161290323 -"pgcharts",-0.3307169052,2.7252468866,-1.42193945,"https://github.com/dimitri/pgcharts","https://github.com/dimitri/pgcharts",2256.897962963,2,6,0,6,31,0,0,31,1,"1",1.75,2 -"pgextwlist",-2.6334021475,-0.1576929626,-3.2620922871,"https://github.com/dimitri/pgextwlist","https://github.com/dimitri/pgextwlist",4298.9919444445,2,19,0,12,42,0,0,42,3,"3",1.9047619047619,2 -"pgl_ddl_deploy",-2.518566076,0.3310770855,-3.2597707489,"https://salsa.debian.org/postgresql/pgl-ddl-deploy","https://github.com/enova/pgl_ddl_deploy.git",2403.2563425926,9,12,0,10,14,0,0,17,1,"1",1.57142857142857,1.82352941176471 -"pglogical_ticker",-1.9930028095,1.9160778986,-3.1056655448,"https://salsa.debian.org/postgresql/pglogical-ticker","https://github.com/enova/pglogical_ticker.git",1787.9691666667,1,7,0,5,4,0,0,5,1,"1",1.875,1.8 -"pgpdump",0.3614395033,1.5189339773,-0.144183693,"https://salsa.debian.org/debian/pgpdump","https://github.com/kazu-yamamoto/pgpdump.git",4538.9134143519,4,16,0,16,27,0,0,28,3,"3",1.8,1.96428571428571 -"pgqd",-1.087235167,1.0595056838,-1.531425517,"https://salsa.debian.org/postgresql/pgqd","https://github.com/pgq/pgqd",2225.1037384259,0,1,0,1,6,0,0,6,1,"1",2,2 -"pgsphere",-0.619432589,1.6193404032,-1.0673571695,"https://salsa.debian.org/postgresql/pgsphere","https://github.com/akorotkov/pgsphere",1961.9147569445,2,10,0,7,24,0,0,26,1,"1",1.83333333333333,1.92307692307692 -"pgsql-asn1oid",-2.1322683467,0.0065837251,-2.973862338,"https://github.com/df7cb/pgsql-asn1oid","https://github.com/df7cb/pgsql-asn1oid",2425.8964351852,3,4,0,5,4,0,0,5,1,"1",1.57142857142857,1.8 -"pgxnclient",-0.8515588813,0.3709704299,-1.1014910489,"https://salsa.debian.org/postgresql/pgxnclient","https://github.com/pgxn/pgxnclient.git",3780.2494212963,0,7,0,7,26,0,1,27,3,"3",2,1.96296296296296 -"pgzero",-0.0710203462,2.371473236,-0.5273222344,"https://github.com/RPi-Distro/pgzero","https://github.com/RPi-Distro/pgzero",1071.605775463,0,31,0,19,0,0,0,19,1,"1",2,1 -"Auth_SASL",0.4421914964,2.6769992169,-0.103972592,"https://salsa.debian.org/php-team/pear/php-auth-sasl","https://github.com/pear/Auth_SASL.git",5614.3564699074,3,10,0,7,4,0,0,8,4,"4",1.76923076923077,1.5 -"ansel",-1.6222799231,-0.0808757241,-1.9210437163,"https://salsa.debian.org/horde-team/php-horde-ansel","https://github.com/horde/ansel.git",3572.8158912037,8,17,0,12,3,0,0,13,2,"2",1.68,1.23076923076923 -"Auth",0.2047852084,2.9463639076,-0.5544067681,"https://salsa.debian.org/horde-team/php-horde-auth","https://github.com/horde/Auth.git",5222.153275463,8,22,0,12,3,0,0,13,4,"4",1.73333333333333,1.23076923076923 -"Cache",-0.1744700522,2.1064596197,-0.6213237314,"https://salsa.debian.org/horde-team/php-horde-cache","https://github.com/horde/Cache.git",5348.4683796296,2,18,0,8,2,0,0,9,4,"4",1.9,1.22222222222222 -"Compress",-0.0162442716,2.57315541,-0.6076939055,"https://salsa.debian.org/horde-team/php-horde-compress","https://github.com/horde/Compress.git",5217.754375,1,13,0,8,5,0,0,9,4,"4",1.92857142857143,1.55555555555556 -"Core",-0.3802607961,0.3526269848,-0.6046153747,"https://salsa.debian.org/horde-team/php-horde-core","https://github.com/horde/Core.git",5226.4980671296,21,34,0,20,9,0,0,25,4,"4",1.61818181818182,1.36 -"Crypt",0.1875117087,2.6751835929,-0.5329652206,"https://salsa.debian.org/horde-team/php-horde-crypt","https://github.com/horde/Crypt.git",5471.7365162037,3,21,0,13,6,0,0,16,4,"4",1.875,1.375 -"Css_Parser",-0.0402081222,2.5291557096,-0.6027329405,"https://salsa.debian.org/horde-team/php-horde-css-parser","https://github.com/horde/Css_Parser.git",3874.0563888889,2,10,0,6,4,0,0,7,3,"3",1.83333333333333,1.57142857142857 -"Data",0.183171821,3.0993813097,-0.5706552519,"https://salsa.debian.org/horde-team/php-horde-data","https://github.com/horde/Data.git",5055.5932638889,0,13,0,7,3,0,0,9,4,"4",2,1.33333333333333 -"Dav",-0.3866587637,0.750534239,-0.6284871625,"https://salsa.debian.org/horde-team/php-horde-dav","https://github.com/horde/Dav.git",3872.1194328704,2,9,0,7,2,0,0,8,3,"3",1.81818181818182,1.25 -"Db",-0.2646821748,1.3792981818,-0.615400448,"https://salsa.debian.org/horde-team/php-horde-db","https://github.com/horde/Db.git",5458.1645833333,6,19,0,14,13,0,0,23,4,"4",1.76,1.56521739130435 -"Editor",-0.2234265847,1.3429870434,-0.6059411864,"https://salsa.debian.org/horde-team/php-horde-editor","https://github.com/horde/Editor.git",5432.4430208333,0,10,0,4,0,0,0,4,4,"4",2,1 -"Form",0.1425278965,2.5646449602,-0.5503801228,"https://salsa.debian.org/horde-team/php-horde-form","https://github.com/horde/Form.git",5422.4999189815,3,17,0,11,2,0,0,13,4,"4",1.85,1.15384615384615 -"gollem",-0.1716189866,2.8981752591,-0.8667773936,"https://salsa.debian.org/horde-team/php-horde-gollem","https://github.com/horde/gollem.git",3924.770474537,2,13,0,7,0,0,0,7,3,"3",1.86666666666667,1 -"groupware",-0.8795755727,1.9558886765,-1.5950928322,"https://salsa.debian.org/horde-team/php-horde-groupware","https://github.com/horde/groupware.git",2932.5787731482,1,6,0,5,0,0,0,5,2,"2",1.85714285714286,1 -"Icalendar",0.411178925,3.9130953916,-0.5130418157,"https://salsa.debian.org/horde-team/php-horde-icalendar","https://github.com/horde/Icalendar.git",5159.3724305556,2,18,0,9,3,0,0,10,4,"4",1.9,1.3 -"Image",0.8616256223,3.8466113515,-0.1929764669,"https://salsa.debian.org/horde-team/php-horde-image","https://github.com/horde/Image.git",5265.7997569445,5,20,0,14,5,0,0,15,4,"4",1.8,1.33333333333333 -"Imap_Client",0.0159896159,2.4567285756,-0.5941860898,"https://salsa.debian.org/horde-team/php-horde-imap-client","https://github.com/horde/Imap_Client.git",5506.4812615741,14,23,0,22,21,0,0,34,4,"4",1.62162162162162,1.61764705882353 -"imp",-0.3872646541,1.289223631,-0.8571466277,"https://salsa.debian.org/horde-team/php-horde-imp","https://github.com/horde/imp.git",5305.9052546296,15,26,0,24,15,0,0,29,4,"4",1.63414634146341,1.51724137931034 -"ingo",-0.7382910403,0.4431034944,-0.9475741714,"https://salsa.debian.org/horde-team/php-horde-ingo","https://github.com/horde/ingo.git",4403.5670833333,10,21,0,17,4,0,0,19,3,"3",1.67741935483871,1.21052631578947 -"JavascriptMinify_Jsmin",-1.3153334642,2.2921605757,-2.4364015778,"https://salsa.debian.org/horde-team/php-horde-javascriptminify-jsmin","https://github.com/horde/JavascriptMinify_Jsmin.git",3603.5893634259,2,12,0,6,1,0,0,7,2,"2",1.85714285714286,1.14285714285714 -"kronolith",-0.1662532613,1.8723658314,-0.7951139086,"https://salsa.debian.org/horde-team/php-horde-kronolith","https://github.com/horde/kronolith.git",4413.8611458333,19,29,0,22,6,0,0,24,3,"3",1.60416666666667,1.25 -"ListHeaders",0.4960376568,4.1898452532,-0.5036453419,"https://salsa.debian.org/horde-team/php-horde-listheaders","https://github.com/horde/ListHeaders.git",4255.5799305556,2,10,0,6,1,0,0,7,3,"3",1.83333333333333,1.14285714285714 -"Mail",-0.3639164444,1.1332103907,-0.6269982172,"https://salsa.debian.org/horde-team/php-horde-mail","https://github.com/horde/Mail.git",4915.3072685185,7,13,0,11,9,0,0,17,3,"3",1.65,1.52941176470588 -"Mapi",-0.0661710252,2.5876798045,-0.6185327392,"https://salsa.debian.org/horde-team/php-horde-mapi","https://github.com/horde/Mapi.git",2259.7966087963,1,5,0,5,3,0,0,6,1,"1",1.83333333333333,1.5 -"Memcache",0.004016163,2.7221166702,-0.6028996022,"https://salsa.debian.org/horde-team/php-horde-memcache","https://github.com/horde/Memcache.git",4490.5543634259,3,7,0,6,1,0,0,7,3,"3",1.7,1.14285714285714 -"Mime",0.312598092,3.6199038108,-0.5392920252,"https://salsa.debian.org/horde-team/php-horde-mime","https://github.com/horde/Mime.git",5432.603287037,7,18,0,12,8,0,0,15,4,"4",1.72,1.53333333333333 -"Mime_Viewer",-0.1149494509,1.9424076317,-0.6016432814,"https://salsa.debian.org/horde-team/php-horde-mime-viewer","https://github.com/horde/Mime_Viewer.git",4839.7695138889,2,13,0,7,0,0,0,7,3,"3",1.86666666666667,1 -"mnemo",-0.6207827443,0.9747903027,-0.8920648669,"https://salsa.debian.org/horde-team/php-horde-mnemo","https://github.com/horde/mnemo.git",4989.4455671296,5,17,0,11,4,0,0,12,4,"4",1.77272727272727,1.33333333333333 -"Mongo",0.9167713268,5.4298937243,-0.4793837277,"https://salsa.debian.org/horde-team/php-horde-mongo","https://github.com/horde/Mongo.git",3839.6499652778,0,8,0,5,0,0,0,5,3,"3",2,1 -"Pack",0.2142725625,3.1945332925,-0.549560368,"https://salsa.debian.org/horde-team/php-horde-pack","https://github.com/horde/Pack.git",3648.4273842593,1,11,0,5,0,0,0,5,2,"2",1.91666666666667,1 -"passwd",-0.9612115226,1.4732179071,-1.6779013899,"https://salsa.debian.org/horde-team/php-horde-passwd","https://github.com/horde/passwd.git",4947.6389583333,4,19,0,12,5,0,0,13,3,"3",1.82608695652174,1.38461538461538 -"Role",-0.4479418321,1.1729020603,-0.7670302689,"https://salsa.debian.org/horde-team/php-horde-role","https://github.com/horde/Role.git",4810.1311111111,0,8,0,5,0,0,0,5,3,"3",2,1 -"sesha",-1.1621564014,1.5450444492,-1.9921994089,"https://salsa.debian.org/horde-team/php-horde-sesha","https://github.com/horde/sesha.git",2802.3719791667,3,8,0,7,1,0,0,8,2,"2",1.72727272727273,1.125 -"Test",-0.238823004,1.8788404924,-0.6415143522,"https://salsa.debian.org/horde-team/php-horde-test","https://github.com/horde/Test.git",5359.615,2,15,0,7,3,0,0,8,4,"4",1.88235294117647,1.375 -"Text_Filter",-0.1437145474,1.0768696744,-0.5555850141,"https://salsa.debian.org/horde-team/php-horde-text-filter","https://github.com/horde/Text_Filter.git",5251.3064930556,3,17,0,9,6,0,0,13,4,"4",1.85,1.46153846153846 -"Text_Filter_Jsmin",-1.3124045178,2.1222615389,-2.421955358,"https://salsa.debian.org/horde-team/php-horde-text-filter-jsmin","https://github.com/horde/Text_Filter_Jsmin.git",2314.7323726852,0,4,0,5,1,0,0,6,1,"1",2,1.16666666666667 -"trean",-0.3058682727,1.9780246873,-0.8789295788,"https://salsa.debian.org/horde-team/php-horde-trean","https://github.com/horde/trean.git",3562.8353472222,2,9,0,7,2,0,0,7,2,"2",1.81818181818182,1.28571428571429 -"turba",-0.4579650553,1.3117889624,-0.8859304773,"https://salsa.debian.org/horde-team/php-horde-turba","https://github.com/horde/turba.git",4857.3907407407,15,22,0,21,16,0,0,32,3,"3",1.59459459459459,1.5 -"webmail",-0.4053353634,1.7962363637,-1.0122255509,"https://salsa.debian.org/horde-team/php-horde-webmail","https://github.com/horde/webmail.git",2950.8800810185,2,6,0,6,2,0,0,6,2,"2",1.75,1.33333333333333 -"whups",-1.0654230845,1.9993317897,-1.8956270843,"https://salsa.debian.org/horde-team/php-horde-whups","https://github.com/horde/whups.git",3431.4867013889,4,18,0,11,0,0,0,11,2,"2",1.81818181818182,1 -"wicked",-1.0749433837,1.994516371,-1.8921752454,"https://salsa.debian.org/horde-team/php-horde-wicked","https://github.com/horde/wicked.git",4893.9981712963,5,14,0,9,5,0,0,11,3,"3",1.73684210526316,1.45454545454545 -"php-invoker",-0.2905127861,1.9595946138,-0.8899334149,"https://salsa.debian.org/php-team/pear/php-invoker","https://github.com/sebastianbergmann/php-invoker",4657.8966203704,2,7,0,5,14,0,0,14,3,"3",1.77777777777778,2 -"Mail_Mime",0.0757330813,0.6687496969,-0.1249911134,"https://salsa.debian.org/php-team/pear/php-mail-mime","https://github.com/pear/Mail_Mime.git",5740.767650463,4,21,0,21,26,0,0,35,4,"4",1.84,1.74285714285714 -"Net_LDAP2",0.6398853183,2.49018646,-0.0984745451,"https://salsa.debian.org/php-team/pear/php-net-ldap2","https://github.com/pear/Net_LDAP2.git",3594.4854166667,3,10,0,6,8,0,0,9,2,"2",1.76923076923077,1.88888888888889 -"Net_Sieve",0.5286086799,2.5513325545,-0.1071035548,"https://salsa.debian.org/php-team/pear/php-net-sieve","https://github.com/pear/Net_Sieve.git",4982.018912037,1,17,0,14,13,0,0,17,3,"3",1.94444444444444,1.76470588235294 -"Net_SMTP",0.6124793985,2.4835695922,0.0048970818,"https://salsa.debian.org/php-team/pear/php-net-smtp","https://github.com/pear/Net_SMTP.git",5742.5019097222,6,20,0,18,56,0,0,58,4,"4",1.76923076923077,1.96551724137931 -"Net_Socket",0.9079949967,3.0405813906,0.1178195629,"https://salsa.debian.org/php-team/pear/php-net-socket","https://github.com/pear/Net_Socket.git",3345.4632523148,1,15,0,13,12,0,0,15,2,"2",1.9375,1.8 -"manifest",0.0385459705,2.4455307258,-0.417874197,"https://salsa.debian.org/php-team/pear/php-phar-io-manifest","https://github.com/phar-io/manifest.git",2379.9058680556,3,9,0,9,17,0,0,18,1,"1",1.75,1.94444444444444 -"ReflectionCommon",0.0165590904,2.2866863971,-0.4124357108,"https://salsa.debian.org/php-team/pear/php-phpdocumentor-reflection-common","https://github.com/phpDocumentor/ReflectionCommon",2836.5084606482,10,9,0,12,17,0,0,17,2,"2",1.47368421052632,2 -"proxy-manager-lts",-0.4696575625,1.7442933083,-0.9000807342,"https://salsa.debian.org/php-team/pear/php-proxy-manager","https://github.com/FriendsOfPHP/proxy-manager-lts.git",3717.8990509259,21,47,0,55,26,0,0,78,2,"2",1.69117647058824,1.33333333333333 -"cache",0.9447656661,4.1692291038,-0.0612099304,"https://salsa.debian.org/php-team/pear/php-psr-cache","https://github.com/php-fig/cache.git",2530.1591435185,8,10,0,14,1,0,0,15,1,"1",1.55555555555556,1.06666666666667 -"http-message",-0.068042639,3.3445895377,-1.0312499156,"https://salsa.debian.org/php-team/pear/php-psr-http-message","https://github.com/php-fig/http-message",3219.4525347222,3,24,0,21,3,0,0,22,2,"2",1.88888888888889,1.13636363636364 -"Base",-0.0522904132,2.7525381131,-0.9743381106,"https://salsa.debian.org/php-team/pear/php-zeta-base","https://github.com/zetacomponents/Base.git",5395.1748726852,0,15,0,9,11,0,0,15,4,"4",2,1.73333333333333 -"ConsoleTools",-0.0924800072,2.7387441567,-0.9975723832,"https://salsa.debian.org/php-team/pear/php-zeta-console-tools","https://github.com/zetacomponents/ConsoleTools",5321.8501851852,2,14,0,12,14,0,0,17,4,"4",1.875,1.82352941176471 -"motranslator",0.3875308077,2.8677316161,-0.26542951,"https://salsa.debian.org/phpmyadmin-team/motranslator","https://github.com/phpmyadmin/motranslator",2762.9628356482,6,14,2,15,27,0,0,27,2,"2",1.7,2 -"global-state",0.247922925,2.3733235469,-0.3166378665,"https://salsa.debian.org/php-team/pear/phpunit-global-state","https://github.com/sebastianbergmann/global-state",3396.3039351852,9,7,0,12,28,0,0,28,2,"2",1.4375,2 -"object-enumerator",0.2543254206,2.979551806,-0.3372246914,"https://salsa.debian.org/php-team/pear/phpunit-object-enumerator","https://github.com/sebastianbergmann/object-enumerator",2872.2632523148,6,4,0,8,11,0,0,11,2,"2",1.4,2 -"pkg-pick",0.1551657364,3.388789847,-0.7551152625,"https://github.com/eavgerinos/pkg-pick","https://github.com/eavgerinos/pkg-pick",1591.7380671296,0,2,0,1,0,0,0,1,1,"1",2,1 -"pickleshare",0.3717500472,2.4243139962,-0.0927808249,"https://salsa.debian.org/python-team/packages/pickleshare","https://github.com/pickleshare/pickleshare",3583.9321875,1,14,0,11,33,0,0,33,2,"2",1.93333333333333,2 -"picocom",0.7162187737,2.5722054768,0.0257322882,"https://salsa.debian.org/debian/picocom","https://github.com/npat-efault/picocom",2876.49875,2,13,0,11,34,0,0,35,2,"2",1.86666666666667,1.97142857142857 -"plexus-interactivity",0.2831519667,2.3330540176,-0.1739153338,"https://salsa.debian.org/java-team/plexus-interactivity-api","https://github.com/codehaus-plexus/plexus-interactivity.git",2997.8996759259,5,11,0,10,10,0,0,12,2,"2",1.6875,1.83333333333333 -"plotnetcfg",-1.0220271784,1.3223739863,-1.4560802079,"https://salsa.debian.org/debian/plotnetcfg","https://github.com/jbenc/plotnetcfg.git",2530.945150463,2,3,0,3,11,0,0,13,1,"1",1.6,1.84615384615385 -"pmailq",-0.3444018612,2.2693637638,-1.1367799542,"https://salsa.debian.org/kolter/pmailq","https://github.com/k0lter/pmailq",3215.8993634259,0,2,0,1,0,0,0,1,2,"2",2,1 -"pmemkv",-2.5666563504,-0.1874336633,-3.0132308585,"https://github.com/kilobyte/pmemkv/tree/debian","https://github.com/kilobyte/pmemkv",2071.5010185185,11,29,0,21,1,0,0,22,1,"1",1.725,1.04545454545455 -"pnscan",0.0474645485,1.175913765,-0.3376962015,"https://salsa.debian.org/pkg-security-team/pnscan","https://github.com/ptrrkssn/pnscan",1864.9276967593,1,4,0,2,6,0,0,6,1,"1",1.8,2 -"podcastparser",0.1102473664,2.4024478231,-0.3412380946,"https://salsa.debian.org/debian/podcastparser","https://github.com/gpodder/podcastparser.git",3885.4088657408,6,16,0,18,26,0,0,26,3,"3",1.72727272727273,2 -"podget",0.0442858046,1.2592098163,-0.4584578402,"https://salsa.debian.org/debian/podget","https://github.com/dvehrs/podget.git",2945.994837963,1,10,0,8,35,0,1,38,2,"2",1.90909090909091,1.92105263157895 -"policyd-rate-limit",-1.5483891938,0.8603109839,-1.9855824959,"https://salsa.debian.org/python-team/packages/policyd-rate-limit","https://github.com/nitmir/policyd-rate-limit.git",2604.4654513889,1,4,0,4,24,0,0,24,1,"1",1.8,2 -"pps-tools",0.7472487963,4.4814305955,-0.4374778463,"https://github.com/bzed/pps-tools","https://github.com/bzed/pps-tools",3767.0434143519,3,10,0,5,2,0,0,7,2,"2",1.76923076923077,1.28571428571429 -"prads",0.259994197,3.8326314267,-1.0339454478,"https://salsa.debian.org/debian/prads","https://github.com/gamelinux/prads.git",4237.0082638889,2,39,0,11,30,0,2,33,3,"3",1.95121951219512,1.90909090909091 -"prefix",-1.1387443889,1.4705314302,-2.0097706447,"https://github.com/dimitri/prefix","https://github.com/dimitri/prefix",5681.2066782408,1,10,0,7,23,0,0,23,4,"4",1.90909090909091,2 -"preggy",-2.9228555263,-1.0464425405,-3.3186736503,"https://salsa.debian.org/python-team/packages/preggy","https://github.com/heynemann/preggy",3206.0471759259,1,12,2,8,14,0,0,16,2,"2",1.92307692307692,1.875 -"preprepare",-2.2210905897,-0.5977303937,-2.5998570115,"https://github.com/dimitri/preprepare","https://github.com/dimitri/preprepare",5242.6337615741,0,4,0,2,5,0,0,5,4,"4",2,2 -"primus_vk",-0.4212908417,2.921882742,-1.2334752443,"https://salsa.debian.org/nvidia-team/primus-vk","https://github.com/felixdoerre/primus_vk",1911.529537037,4,7,0,9,59,0,0,61,1,"1",1.63636363636364,1.9672131147541 -"princeprocessor",-1.2692837532,1.0737092479,-1.7210172993,"https://salsa.debian.org/pkg-security-team/princeprocessor","https://github.com/hashcat/princeprocessor.git",3216.9043981482,0,10,0,6,22,0,0,22,2,"2",2,2 -"proftpd-mod_case",-1.4646475873,0.7662724504,-2.0254092437,"https://salsa.debian.org/debian-proftpd-team/proftpd-mod-case","https://github.com/Castaglia/proftpd-mod_case.git",4180.9304050926,0,4,0,1,5,0,0,5,3,"3",2,2 -"mod_clamav",-0.5199500157,1.6804203805,-1.2969019371,"https://salsa.debian.org/debian-proftpd-team/proftpd-mod-clamav","https://github.com/jbenden/mod_clamav.git",3704.0200810185,2,4,0,5,16,0,0,17,2,"2",1.66666666666667,1.94117647058824 -"proftpd-mod_counter",-3.9091957799,-1.6311020735,-4.3444753088,"https://salsa.debian.org/debian-proftpd-team/proftpd-mod-counter","https://github.com/Castaglia/proftpd-mod_counter",4182.156412037,0,3,0,1,3,0,0,3,3,"3",2,2 -"proftpd-mod_msg",-1.7610775956,0.1821621492,-2.2899965266,"https://salsa.debian.org/debian-proftpd-team/proftpd-mod-msg","https://github.com/Castaglia/proftpd-mod_msg",1530.1719212963,0,2,0,1,1,0,0,1,1,"1",2,2 -"proftpd-mod_tar",-1.0180464333,1.4128864786,-1.7353120048,"https://salsa.debian.org/debian-proftpd-team/proftpd-mod-tar","https://github.com/Castaglia/proftpd-mod_tar.git",4180.9053935185,0,2,0,1,3,0,0,3,3,"3",2,2 -"proftpd-mod_vroot",1.5988542337,4.0231527893,0.5685130663,"https://salsa.debian.org/debian-proftpd-team/proftpd-mod-vroot","https://github.com/Castaglia/proftpd-mod_vroot.git",3875.2868518519,0,5,0,3,23,0,0,23,3,"3",2,2 -"bind_exporter",-1.219120384,0.70031567,-1.6696173791,"https://salsa.debian.org/go-team/packages/prometheus-bind-exporter","https://github.com/prometheus-community/bind_exporter",2946.8200115741,21,14,0,25,30,0,1,51,2,"2",1.4,1.58823529411765 -"mailexporter",-1.4619262945,0.8353265582,-1.9708877275,"https://salsa.debian.org/go-team/packages/prometheus-mailexporter","https://github.com/cherti/mailexporter",2367.3820486111,4,4,1,6,16,0,0,16,1,"1",1.5,2 -"pspg",-0.3610506999,2.0130078842,-0.820706513,"https://salsa.debian.org/postgresql/pspg","https://github.com/okbob/pspg",2316.4040509259,13,25,0,29,14,0,0,39,1,"1",1.65789473684211,1.35897435897436 -"Psychtoolbox-3",0.2033527556,1.6529232576,-0.3714926285,"https://github.com/neurodebian/Psychtoolbox-3/tree/debian","https://github.com/neurodebian/Psychtoolbox-3",5782.8479166667,14,56,0,38,2,0,0,39,4,"4",1.8,1.05128205128205 -"pt2-clone",-0.3668249418,2.0442471334,-0.8709375553,"https://salsa.debian.org/multimedia-team/pt2-clone","https://github.com/8bitbubsy/pt2-clone",1458.0896180556,2,4,0,4,7,0,0,10,1,"1",1.66666666666667,1.7 -"PTable",-0.4977567219,1.9029777422,-1.0355607788,"https://salsa.debian.org/python-team/packages/ptable","https://github.com/kxxoling/PTable",3352.2971990741,2,16,0,9,45,0,0,45,2,"2",1.88888888888889,2 -"printer-driver-ptouch",2.9461393952,6.8234280435,1.5185561181,"https://salsa.debian.org/printing-team/ptouch-driver","https://github.com/philpem/printer-driver-ptouch.git",1342.5621990741,5,13,0,9,42,0,1,45,1,"1",1.72222222222222,1.93333333333333 -"puppetlabs-mysql",-1.0852269476,0.911414697,-1.5945594785,"https://salsa.debian.org/puppet-team/puppet-module-puppetlabs-mysql","https://github.com/puppetlabs/puppetlabs-mysql",4577.2790046296,89,362,0,277,0,0,0,277,3,"3",1.80266075388027,1 -"puppetlabs-xinetd",-1.728520912,0.7618236366,-2.2296657543,"https://salsa.debian.org/puppet-team/puppet-module-puppetlabs-xinetd","https://github.com/puppetlabs/puppetlabs-xinetd",4771.0705671296,11,67,0,44,13,0,0,53,3,"3",1.85897435897436,1.24528301886792 -"purl",-1.3403902917,0.9095061718,-1.8075410282,"https://salsa.debian.org/python-team/packages/purl","https://github.com/codeinthehole/purl",3937.9855092593,4,18,0,13,36,0,0,36,3,"3",1.81818181818182,2 -"pwgen",1.3539562516,2.2914753933,0.7855817259,"https://github.com/tytso/pwgen","https://github.com/tytso/pwgen",1771.0365509259,6,3,0,5,16,0,0,18,1,"1",1.33333333333333,1.88888888888889 -"project--perl-webget",-0.4530628758,1.9572713675,-1.0628915119,"https://salsa.debian.org/debian/pwget","https://github.com/jaalto/project--perl-webget",3883.3964236111,0,1,0,1,0,0,0,1,3,"3",2,1 -"pydl",-0.4956083654,0.3240229847,-0.642218824,"https://salsa.debian.org/debian-astro-team/pydl","https://github.com/weaverba137/pydl",4774.0527777778,1,11,1,10,23,0,0,26,3,"3",1.91666666666667,1.88461538461538 -"pyepr",-0.9391839973,0.1389487685,-1.21878767,"https://salsa.debian.org/debian-gis-team/pyepr","https://github.com/avalentino/pyepr.git",4620.4665856482,0,3,0,1,7,0,0,7,3,"3",2,2 -"pyfribidi",-1.3111437363,-0.4469862862,-1.5898484292,"https://salsa.debian.org/python-team/packages/pyfribidi","https://github.com/pediapress/pyfribidi.git",2842.4984953704,1,5,0,3,14,0,0,14,2,"2",1.83333333333333,2 -"PyGnuplot",-0.3092811424,1.9971008368,-0.816765548,"https://salsa.debian.org/python-team/packages/pygnuplot","https://github.com/benschneider/PyGnuplot",2586.3193055556,0,7,0,3,14,0,0,14,1,"1",2,2 -"PyGreSQL",0.6546350335,1.713004741,0.0882104427,"https://salsa.debian.org/debian/pygresql","https://github.com/PyGreSQL/PyGreSQL",5390.1054513889,4,4,4,8,32,0,0,36,4,"4",1.5,1.88888888888889 -"pygtail",-0.539020119,3.1329292561,-1.6179088283,"https://salsa.debian.org/python-team/packages/pygtail","https://github.com/bgreenlee/pygtail",4147.3947800926,7,19,0,17,74,0,0,75,3,"3",1.73076923076923,1.98666666666667 -"pygtkspellcheck",0.7257355054,2.6166114148,0.0292934832,"https://salsa.debian.org/python-team/packages/pygtkspellcheck","https://github.com/koehlma/pygtkspellcheck",4478.3301851852,2,11,1,6,23,0,0,23,3,"3",1.84615384615385,2 -"python-pass",-0.8847004821,1.9218976351,-1.6206835515,"https://salsa.debian.org/python-team/packages/pypass","https://github.com/ReAzem/python-pass.git",1834.5500810185,3,11,0,9,16,0,1,17,1,"1",1.78571428571429,1.94117647058824 -"pypdf",0.3363136294,1.8784846763,-0.1155181855,"https://salsa.debian.org/debian/pypdf","https://github.com/py-pdf/pypdf",4367.5921759259,137,91,3,200,0,0,0,200,3,"3",1.39912280701754,1 -"python-pypeg2-debian",0.0855915399,2.2545524529,-0.3458051782,"https://github.com/fiete201/python-pypeg2-debian","https://github.com/fiete201/python-pypeg2-debian",825.4394097222,0,2,0,1,1,0,0,2,1,"1",2,1.5 -"Pyphen",-0.5188951039,1.8020010624,-0.9777786823,"https://salsa.debian.org/python-team/packages/pyphen","https://github.com/Kozea/Pyphen",3769.9223263889,0,13,0,5,56,0,0,57,3,"3",2,1.98245614035088 -"pyqso",-0.3070953036,2.5075014452,-0.9777672312,"https://salsa.debian.org/debian-hamradio-team/pyqso","https://github.com/ctjacobs/pyqso",2213.7885648148,2,9,5,5,25,0,0,25,1,"1",1.81818181818182,2 -"PyQwt3D",-0.3970590115,0.7440597483,-0.9451413135,"https://salsa.debian.org/python-team/packages/pyqwt3d","https://github.com/GauiStori/PyQwt3D",1540.4164930556,0,3,0,1,1,0,0,2,1,"1",2,1.5 -"pyRFC3339",0.2375193564,1.6166813486,-0.0819212234,"https://salsa.debian.org/python-team/packages/pyrfc3339","https://github.com/kurtraschke/pyRFC3339",3552.2014583333,1,7,0,7,14,0,0,14,2,"2",1.875,2 -"pysmi",0.2393270185,2.2118303467,-0.1841478946,"https://salsa.debian.org/python-team/packages/pysmi","https://github.com/etingof/pysmi",1806.3306018519,5,7,0,9,59,0,0,60,1,"1",1.58333333333333,1.98333333333333 -"pytest-runner",0.4615736429,3.294817871,-0.4721455985,"https://salsa.debian.org/python-team/packages/pytest-runner","https://github.com/pytest-dev/pytest-runner.git",4387.1189699074,16,10,0,24,56,0,0,67,3,"3",1.38461538461538,1.83582089552239 -"pytest-tornado",-1.6610342646,0.2346703329,-2.0594120368,"https://salsa.debian.org/python-team/packages/pytest-tornado","https://github.com/eugeniy/pytest-tornado",2043.2375578704,2,15,0,12,44,0,0,44,1,"1",1.88235294117647,2 -"activipy",-2.4231132595,-0.8156429792,-2.7787913771,"https://salsa.debian.org/python-team/packages/python-activipy","https://github.com/w3c-social/activipy",294.9819907407,0,1,0,1,9,0,0,9,1,"1",2,2 -"python-admesh",-0.1275889532,1.1910011407,-0.48238652,"https://salsa.debian.org/science-team/python-admesh","https://github.com/admesh/python-admesh",1607.8702662037,1,1,0,2,9,0,0,9,1,"1",1.5,2 -"alignlib",-4.6393972307,-1.9112598753,-5.3987487651,"https://salsa.debian.org/med-team/python-alignlib","https://github.com/marcelm/alignlib.git",1738.8239930556,1,3,0,2,2,0,0,2,1,"1",1.75,2 -"altgraph",-0.1776641612,2.0796554317,-0.6175630942,"https://salsa.debian.org/python-team/packages/python-altgraph","https://github.com/ronaldoussoren/altgraph",5013.4008912037,1,6,0,4,5,0,0,7,4,"4",1.85714285714286,1.71428571428571 -"arpy",-0.7545902864,2.54869808,-1.7298420281,"https://salsa.debian.org/python-team/packages/python-arpy","https://github.com/viraptor/arpy.git",4328.1231134259,1,9,0,8,14,0,0,17,3,"3",1.9,1.82352941176471 -"asttokens",0.3340810363,3.0114183655,-0.2887013264,"https://salsa.debian.org/python-team/packages/python-asttokens","https://github.com/gristlabs/asttokens.git",2518.9855439815,9,8,0,14,30,0,0,33,1,"1",1.47058823529412,1.90909090909091 -"python-caja",0.0214160855,0.7395995669,-0.2085070184,"https://salsa.debian.org/debian-mate-team/python-caja","https://github.com/mate-desktop/python-caja.git",4326.7211342593,10,21,0,18,39,0,0,45,3,"3",1.67741935483871,1.86666666666667 -"python-driver",-0.8062754247,1.604168392,-1.7480948985,"https://salsa.debian.org/python-team/packages/python-cassandra-driver","https://github.com/datastax/python-driver.git",3941.7978935185,43,186,0,129,3,0,0,130,3,"3",1.81222707423581,1.02307692307692 -"changelog",-1.7044805447,-0.290367733,-2.0502430594,"https://salsa.debian.org/python-team/packages/python-changelog","https://github.com/sqlalchemyorg/changelog",3951.4740509259,6,7,0,5,7,0,0,8,3,"3",1.53846153846154,1.875 -"cheroot",0.2184766626,2.5790389703,-0.2566344453,"https://salsa.debian.org/python-team/packages/python-cheroot","https://github.com/cherrypy/cheroot.git",5771.2991898148,32,151,0,116,6,0,0,117,4,"4",1.82513661202186,1.05128205128205 -"click-plugins",0.1835966503,2.5094374551,-0.2993391913,"https://salsa.debian.org/debian-gis-team/python-click-plugins/","https://github.com/click-contrib/click-plugins.git",1359.2907638889,1,8,0,5,25,0,0,25,1,"1",1.88888888888889,2 -"cligj",0.0110381728,2.5995508465,-0.499940708,"https://salsa.debian.org/debian-gis-team/python-cligj","https://github.com/mapbox/cligj.git",2777.8914699074,2,10,0,5,17,0,0,18,2,"2",1.83333333333333,1.94444444444444 -"python-debianbts",0.5135384712,1.0251605893,0.2314442315,"https://github.com/venthur/python-debianbts","https://github.com/venthur/python-debianbts",5257.8413310185,2,16,0,12,20,0,0,22,4,"4",1.88888888888889,1.90909090909091 -"deeptools_intervals",-2.8771627651,-0.6096159473,-3.3226496791,"https://salsa.debian.org/med-team/python-deeptoolsintervals","https://github.com/deeptools/deeptools_intervals",1246.0450694445,0,4,0,1,4,0,0,4,1,"1",2,2 -"demjson",-0.2370389615,1.8179175852,-0.8013751143,"https://salsa.debian.org/python-team/packages/python-demjson","https://github.com/dmeranda/demjson",1291.8414699074,0,1,0,1,3,0,2,5,1,"1",2,1.6 -"deprecated",0.1196653299,2.2597788252,-0.3084855603,"https://salsa.debian.org/debian-gis-team/python-deprecated","https://github.com/tantale/deprecated.git",2057.2850694445,18,4,0,17,55,0,0,55,1,"1",1.18181818181818,2 -"diaspy",-2.1745867988,0.053506734,-2.6165608868,"https://salsa.debian.org/python-team/packages/python-diaspy","https://github.com/marekjm/diaspy",3779.1691319445,4,18,0,10,31,0,0,31,3,"3",1.81818181818182,2 -"diff-match-patch",0.5846033815,3.0986556298,-0.1184020196,"https://salsa.debian.org/debian/python-diff-match-patch","https://github.com/diff-match-patch-python/diff-match-patch",1729.8804282407,3,2,0,3,3,0,0,5,1,"1",1.4,1.6 -"django-contact-form",-1.1097333705,0.6281218172,-1.6435972974,"https://salsa.debian.org/python-team/packages/python-django-contact-form","https://github.com/ubernostrum/django-contact-form",5539.2370717593,2,14,0,13,45,0,0,45,4,"4",1.875,2 -"django-etcd-settings",-0.9896632674,2.2575790822,-1.9919766953,"https://salsa.debian.org/python-team/packages/python-django-etcd-settings","https://github.com/kpn-digital/django-etcd-settings",2402.9784375,6,17,0,10,16,0,0,17,1,"1",1.73913043478261,1.94117647058824 -"django-gravatar",-0.663578474,1.1679046767,-1.1279388031,"https://salsa.debian.org/python-team/packages/python-django-gravatar2","https://github.com/twaddington/django-gravatar",3121.6933101852,1,16,0,12,30,0,0,30,2,"2",1.94117647058824,2 -"django-jsonfield",-1.0714207355,-0.0546197296,-1.3093579612,"https://salsa.debian.org/python-team/modules/python-django-jsonfield","https://github.com/adamchainz/django-jsonfield",3841.3997222222,3,25,0,23,14,0,0,33,3,"3",1.89285714285714,1.42424242424242 -"django-libsass",-4.8173196894,-2.3911675188,-5.4384155483,"https://salsa.debian.org/python-team/packages/python-django-libsass","https://github.com/torchbox/django-libsass.git",3571.0059490741,10,9,0,14,47,0,1,52,2,"2",1.47368421052632,1.90384615384615 -"python-ecdsa",0.1427395231,1.7301290558,-0.1550589722,"https://salsa.debian.org/python-team/packages/python-ecdsa","https://github.com/warner/python-ecdsa.git",4921.8631134259,21,34,0,44,13,0,0,51,3,"3",1.61818181818182,1.25490196078431 -"python-epc",-0.6679338747,1.8418923245,-1.2097561588,"https://salsa.debian.org/python-team/packages/python-epc","https://github.com/tkf/python-epc",2413.0286574074,1,4,0,3,7,0,0,7,1,"1",1.8,2 -"esmre",-2.0064156677,0.202087282,-2.4755780824,"https://salsa.debian.org/debian/python-esmre","https://github.com/wharris/esmre.git",5681.6213078704,0,3,0,1,15,0,0,15,4,"4",2,2 -"python-ethtool",0.2749622306,1.8273292709,-0.3035215573,"https://salsa.debian.org/python-team/packages/python-ethtool","https://github.com/fedora-python/python-ethtool/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA -"python-fastimport",0.1052775184,1.7457116755,-0.2624270625,"https://salsa.debian.org/python-team/packages/python-fastimport","https://github.com/jelmer/python-fastimport",5680.5950578704,13,39,0,27,14,0,0,34,4,"4",1.75,1.41176470588235 -"fisx",-0.0903144328,1.779732029,-0.5983249377,"https://salsa.debian.org/python-team/packages/python-fisx","https://github.com/vasole/fisx",3592.9752777778,0,12,0,5,12,0,1,13,2,"2",2,1.92307692307692 -"fluids",-0.4421216281,2.7506775199,-1.3660582858,"https://salsa.debian.org/science-team/python-fluids","https://github.com/CalebBell/fluids/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA -"python-frozendict",0.1906884697,2.6355499741,-0.3237980302,"https://salsa.debian.org/openstack-team/python/python-frozendict","https://github.com/slezica/python-frozendict.git",1398.6479861111,1,9,0,6,48,0,0,48,1,"1",1.9,2 -"hiredis-py",-0.3124185118,1.2752110833,-0.6377697773,"https://salsa.debian.org/python-team/packages/python-hiredis","https://github.com/redis/hiredis-py.git",4704.1113541667,26,23,0,38,10,0,0,46,3,"3",1.46938775510204,1.21739130434783 -"python-hl7",-0.7626378243,0.9988106393,-1.372928154,"https://salsa.debian.org/med-team/python-hl7","https://github.com/johnpaulett/python-hl7.git",5098.8429398148,5,6,0,7,54,0,0,54,4,"4",1.54545454545455,2 -"hupper",-0.4811484079,1.3299311475,-0.8419038999,"https://salsa.debian.org/python-team/packages/python-hupper","https://github.com/Pylons/hupper",2605.9951273148,4,15,0,12,35,0,0,38,1,"1",1.78947368421053,1.92105263157895 -"imagesize_py",0.7812671799,3.7438976125,-0.0426186257,"https://salsa.debian.org/python-team/packages/python-imagesize","https://github.com/shibukawa/imagesize_py",2343.1267013889,9,9,0,15,45,0,0,45,1,"1",1.5,2 -"python-Levenshtein",0.4783401273,1.9718349997,-0.0580315974,"https://salsa.debian.org/python-team/packages/python-levenshtein","https://github.com/maxbachmann/python-Levenshtein",378.9515509259,1,2,0,1,9,0,0,9,1,"1",1.66666666666667,2 -"python-libdiscid",0.0391061082,1.6124132852,-0.2458440286,"https://salsa.debian.org/multimedia-team/python-libdiscid","https://github.com/sebastinas/python-libdiscid.git",3900.1796643519,3,5,0,6,8,0,0,8,3,"3",1.625,2 -"python-librtmp-debian",0.1316033854,2.9370114855,-0.6388179337,"https://github.com/breunigs/python-librtmp-debian","https://github.com/breunigs/python-librtmp-debian",409.9315625,0,1,0,1,0,0,0,1,1,"1",2,1 -"python-louvain",-2.2685779365,1.4962495682,-3.4339761137,"https://salsa.debian.org/python-team/packages/python-louvain","https://github.com/taynaud/python-louvain/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA -"lti",-1.9083591935,0.6995479122,-2.570199413,"https://salsa.debian.org/python-team/packages/python-lti","https://github.com/pylti/lti.git",2862.783125,11,19,0,21,32,0,0,42,2,"2",1.63333333333333,1.76190476190476 -"macholib",-0.2065761669,2.1953061241,-0.6422011034,"https://salsa.debian.org/python-team/packages/python-macholib","https://github.com/ronaldoussoren/macholib",5321.569525463,1,18,0,12,8,0,0,17,4,"4",1.94736842105263,1.47058823529412 -"py-magcode-core",-0.7794988336,2.2254089124,-1.7093223217,"https://github.com/grantma/py-magcode-core","https://github.com/grantma/py-magcode-core",2649.7967939815,0,2,0,1,0,0,0,1,1,"1",2,1 -"markdown",-0.0672775301,0.0633658209,-0.1115484973,"https://salsa.debian.org/python-team/packages/python-markdown","https://github.com/Python-Markdown/markdown",5779.5951967593,101,82,0,147,24,0,96,260,4,"4",1.44808743169399,1.09230769230769 -"multipletau",-0.6987933509,0.5806821661,-0.9526942305,"https://salsa.debian.org/python-team/packages/python-multipletau","https://github.com/FCS-analysis/multipletau",3692.0178935185,2,10,0,4,7,0,0,7,2,"2",1.83333333333333,2 -"murmurhash",-0.581276748,1.7599072349,-1.1918965779,"https://salsa.debian.org/python-team/packages/python-murmurhash","https://github.com/explosion/murmurhash",3382.167962963,3,8,0,7,24,0,0,25,2,"2",1.72727272727273,1.96 -"netaddr",0.0168867873,0.3272246191,-0.1009353472,"https://salsa.debian.org/python-team/packages/python-netaddr","https://github.com/netaddr/netaddr/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA -"python-netfilter",-1.0831097652,1.3819658705,-1.6354879803,"https://salsa.debian.org/python-team/modules/python-netfilter","https://github.com/jlaine/python-netfilter.git",1238.4928935185,0,1,0,1,5,0,0,5,1,"1",2,2 -"python-netsyslog",-3.0699282944,-0.7408374792,-3.6931507709,"https://github.com/dpocock/python-netsyslog","https://github.com/dpocock/python-netsyslog",1856.5705092593,0,2,0,2,0,0,0,2,1,"1",2,1 -"nine",-0.8784732907,1.5749400058,-1.435685821,"https://salsa.debian.org/python-team/packages/python-nine","https://github.com/nandoflorestan/nine",2401.4576273148,0,3,0,2,5,0,0,5,1,"1",2,2 -"noise",-3.7225843383,-1.0965675709,-4.3183675373,"https://salsa.debian.org/python-team/packages/python-noise","https://github.com/caseman/noise.git",2101.5036111111,1,8,0,6,49,0,0,49,1,"1",1.88888888888889,2 -"nose-random",-2.0063531384,0.3270712054,-2.4723359773,"https://salsa.debian.org/science-team/python-nose-random","https://github.com/fzumstein/nose-random",352.6133101852,0,1,0,1,3,0,0,4,1,"1",2,1.75 -"numpysane",-0.4267537204,1.9973501717,-0.9903343511,"https://salsa.debian.org/python-team/packages/python-numpysane","https://github.com/dkogan/numpysane",2696.1738194445,0,2,0,1,3,0,0,3,1,"1",2,2 -"padme",-0.8073688582,2.1816485148,-1.677229387,"https://salsa.debian.org/python-team/packages/python-padme","https://github.com/zyga/padme",2875.0020023148,1,3,1,1,3,0,0,3,2,"2",1.75,2 -"pkgconfig",0.1589137832,2.4301443545,-0.3239570925,"https://salsa.debian.org/python-team/packages/python-pkgconfig","https://github.com/matze/pkgconfig",2902.384537037,4,12,0,14,42,0,0,42,2,"2",1.75,2 -"plaster",-0.2804648853,2.1267152731,-0.8306048313,"https://salsa.debian.org/python-team/packages/python-plaster","https://github.com/pylons/plaster",2744.1181365741,7,5,0,7,13,0,0,13,1,"1",1.41666666666667,2 -"plaster_pastedeploy",-0.2975329299,2.1673923637,-0.8381262743,"https://salsa.debian.org/python-team/packages/python-plaster-pastedeploy","https://github.com/Pylons/plaster_pastedeploy.git",2741.5056365741,4,5,0,7,13,0,0,14,1,"1",1.55555555555556,1.92857142857143 -"pluginbase",-0.2812881057,2.0590234382,-0.7551622974,"https://salsa.debian.org/python-team/packages/python-pluginbase","https://github.com/mitsuhiko/pluginbase.git",2511.8068518519,1,9,0,7,38,0,1,40,1,"1",1.9,1.95 -"python-popcon",-0.2335331727,2.0183447681,-1.1098924395,"https://github.com/venthur/python-popcon","https://github.com/venthur/python-popcon",4753.6013657408,3,5,0,5,7,0,0,9,3,"3",1.625,1.77777777777778 -"python-poppler-qt5",0.1202276082,2.3680686792,-0.3076713871,"https://salsa.debian.org/python-team/packages/python-poppler-qt5","https://github.com/frescobaldi/python-poppler-qt5",3161.7950231482,7,7,1,11,89,0,1,90,2,"2",1.5,1.98888888888889 -"python_portpicker",-0.8378084904,1.8598481156,-1.5521700439,"https://salsa.debian.org/debian/python-portpicker","https://github.com/google/python_portpicker",3069.1269212963,11,7,0,10,15,0,0,15,2,"2",1.38888888888889,2 -"pure-python-otr",-0.0437206443,2.0655225856,-0.6499675642,"https://salsa.debian.org/python-team/packages/python-potr","https://github.com/python-otr/pure-python-otr",3956.9618634259,0,15,3,8,52,0,2,54,3,"3",2,1.96296296296296 -"pretend",-0.7061164562,2.3197823691,-1.5465608612,"https://salsa.debian.org/python-team/packages/python-pretend","https://github.com/alex/pretend",3941.0314351852,2,9,0,9,19,0,0,19,3,"3",1.81818181818182,2 -"python-progressbar",0.3759281126,2.2892745816,-0.1083290674,"https://salsa.debian.org/python-team/packages/python-progressbar","https://github.com/niltonvolpato/python-progressbar",3503.7755555556,3,12,0,8,61,0,0,63,2,"2",1.8,1.96825396825397 -"python-protobix",-3.1476883564,-0.7372721621,-3.7253868496,"https://salsa.debian.org/python-team/packages/python-protobix","https://github.com/jbfavre/python-protobix",3133.4746064815,0,14,1,0,16,0,0,16,2,"2",2,2 -"pulp",0.1825004112,2.2768415582,-0.3249522323,"https://salsa.debian.org/math-team/python-pulp","https://github.com/coin-or/pulp/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA -"Pweave",0.1974177671,3.6215699256,-0.8175147018,"https://salsa.debian.org/science-team/python-pweave","https://github.com/mpastell/Pweave/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA -"pybadges",-3.4188935767,0.0271868396,-4.2767006556,"https://salsa.debian.org/python-team/packages/python-pybadges","https://github.com/google/pybadges.git",1932.0270833333,2,14,0,12,29,0,0,29,1,"1",1.875,2 -"pyqrencode",0.0034268604,1.6950809833,-0.4794074089,"https://salsa.debian.org/debian/python-qrencode","https://github.com/Arachnid/pyqrencode.git",3791.5353703704,0,6,0,5,22,0,0,22,3,"3",2,2 -"ratelimiter",-0.1714954577,2.6072632937,-0.9266913485,"https://salsa.debian.org/python-team/packages/python-ratelimiter","https://github.com/RazerM/ratelimiter",1781.4938425926,1,5,0,3,29,0,0,30,1,"1",1.83333333333333,1.96666666666667 -"rebulk",-0.1999574426,2.0907811548,-0.82792677,"https://salsa.debian.org/python-team/packages/python-rebulk","https://github.com/Toilal/rebulk",3019.4120833333,1,7,2,4,15,0,0,16,2,"2",1.875,1.9375 -"rencode",0.3723707617,3.0060692556,-0.2039050857,"https://salsa.debian.org/debian/python-rencode","https://github.com/aresch/rencode.git",4103.1734490741,4,4,0,5,18,0,0,18,3,"3",1.5,2 -"repoze.sphinx.autointerface",-1.3367767902,1.5129207319,-2.1830695792,"https://salsa.debian.org/python-team/packages/python-repoze.sphinx.autointerface","https://github.com/repoze/repoze.sphinx.autointerface/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA -"repoze.tm2",-0.795011466,1.8758832556,-1.600218467,"https://salsa.debian.org/python-team/packages/python-repoze.tm2","https://github.com/repoze/repoze.tm2.git",5299.0136921296,0,6,0,3,8,0,0,8,4,"4",2,2 -"roman",0.4266969046,1.9457667884,-0.0044298123,"https://salsa.debian.org/python-team/packages/python-roman","https://github.com/zopefoundation/roman",5054.6666666667,3,8,0,8,15,0,0,19,4,"4",1.72727272727273,1.78947368421053 -"python-signedjson",-0.4972041941,1.1352937233,-0.7813605442,"https://salsa.debian.org/matrix-team/python-signedjson","https://github.com/matrix-org/python-signedjson.git",2409.117025463,5,10,0,10,14,0,0,14,1,"1",1.66666666666667,2 -"python-slip",0.6771552086,2.9650065243,-0.0680375927,"https://salsa.debian.org/debian/python-slip","https://github.com/nphilipp/python-slip.git",4760.8424189815,5,3,0,4,10,0,0,11,3,"3",1.375,1.90909090909091 -"smmap",0.0842345215,1.8862167897,-0.302978642,"https://salsa.debian.org/python-team/packages/python-smmap","https://github.com/gitpython-developers/smmap",4570.872037037,4,18,0,16,38,0,0,38,3,"3",1.81818181818182,2 -"snuggs",-0.4089829703,1.0919909019,-0.6715786054,"https://salsa.debian.org/debian-gis-team/python-snuggs","https://github.com/mapbox/snuggs.git",1698.5099305556,2,7,0,5,16,0,0,16,1,"1",1.77777777777778,2 -"socketpool",-0.433473063,1.9120698535,-1.1349538282,"https://salsa.debian.org/python-team/packages/python-socketpool","https://github.com/benoitc/socketpool",2141.4605208333,0,17,0,11,31,0,0,32,1,"1",2,1.96875 -"PySocksipyChain",-0.0678442589,2.0576051001,-0.7593283222,"https://salsa.debian.org/freedombox-team/python-socksipychain","https://github.com/pagekite/PySocksipyChain.git",3262.1183564815,1,7,0,4,12,0,0,12,2,"2",1.875,2 -"pysrp",-0.2655598789,2.0901350297,-0.982879077,"https://salsa.debian.org/python-team/packages/python-srp","https://github.com/cocagne/pysrp",4536.7902777778,2,26,0,14,45,0,0,45,3,"3",1.92857142857143,2 -"python-ssdeep",-1.6753783276,-0.7457424439,-1.8662568075,"https://salsa.debian.org/python-team/packages/python-ssdeep","https://github.com/DinoTools/python-ssdeep/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA -"static3",-2.1484350509,0.7824659551,-2.9204988941,"https://salsa.debian.org/debian/python-static3","https://github.com/rmohr/static3",1017.1397800926,0,5,0,4,21,0,0,21,1,"1",2,2 -"stopit",-1.4382358759,1.0640373111,-2.3707053284,"https://salsa.debian.org/python-team/packages/python-stopit","https://github.com/glenfant/stopit",2025.0025810185,3,4,0,7,38,0,0,38,1,"1",1.57142857142857,2 -"python-subprocess32",0.809721279,3.7269442727,-0.0005664334,"https://salsa.debian.org/python-team/modules/python-subprocess32","https://github.com/google/python-subprocess32",2769.8086226852,4,6,0,6,75,0,0,75,2,"2",1.6,2 -"python-sunlight",-0.4386787931,3.6650119727,-1.7599151869,"https://salsa.debian.org/python-team/modules/python-sunlight","https://github.com/sunlightlabs/python-sunlight",1218.8703009259,0,11,0,8,23,0,0,25,1,"1",2,1.92 -"python-tblib",-0.7353049539,0.9990220369,-1.1483402151,"https://salsa.debian.org/python-team/packages/python-tblib","https://github.com/ionelmc/python-tblib",3634.6597453704,5,11,0,12,50,0,0,51,2,"2",1.6875,1.98039215686275 -"urlobject",-1.4032067102,1.0645121312,-1.9682182483,"https://salsa.debian.org/python-team/packages/python-urlobject","https://github.com/zacharyvoase/urlobject",3098.5456481482,4,10,0,8,31,0,0,31,2,"2",1.71428571428571,2 -"urwidtrees",0.4916470757,4.0558334655,-0.5275660918,"https://salsa.debian.org/python-team/packages/python-urwidtrees","https://github.com/pazz/urwidtrees/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA -"python-sdk",-2.1064074455,0.1631136587,-2.60808327,"https://salsa.debian.org/pkg-security-team/python-vulndb","https://github.com/vulndb/python-sdk",1623.0260300926,0,3,0,2,5,0,0,5,1,"1",2,2 -"word_cloud",-2.3533134617,-0.117333833,-2.7862995006,"https://salsa.debian.org/python-team/packages/python-wordcloud","https://github.com/amueller/word_cloud",4051.6273842593,33,54,0,65,30,0,1,89,3,"3",1.62068965517241,1.33707865168539 -"wsproto",0.0162269703,2.3090059731,-0.4249971154,"https://salsa.debian.org/python-team/packages/python-wsproto","https://github.com/python-hyper/wsproto/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA -"python3-xapp",0.4966659567,2.7934932391,-0.0692386084,"https://salsa.debian.org/cinnamon-team/python-xapp","https://github.com/linuxmint/python3-xapp.git",2312.6997685185,5,4,0,7,13,0,0,13,1,"1",1.44444444444444,2 -"python-xeddsa",-1.1633252234,1.3819292376,-1.7395228535,"https://salsa.debian.org/python-team/packages/python-xeddsa","https://github.com/Syndace/python-xeddsa",1709.0088425926,1,4,0,1,2,0,0,2,1,"1",1.8,2 -"xlrd3",0.2419722546,1.6921113748,-0.1509001314,"https://salsa.debian.org/python-team/packages/python-xlrd","https://github.com/Dragon2fly/xlrd3.git",4601.1105092593,9,44,0,35,8,0,0,42,3,"3",1.83018867924528,1.19047619047619 -"xmltodict",0.5981063759,3.2438940023,-0.1054526563,"https://salsa.debian.org/debian/python-xmltodict","https://github.com/martinblech/xmltodict.git",3981.1987152778,26,29,0,41,54,0,1,89,3,"3",1.52727272727273,1.60674157303371 -"xopen",-0.3435053785,1.7701848391,-0.7787807244,"https://salsa.debian.org/python-team/packages/python-xopen","https://github.com/marcelm/xopen/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA -"pyzor",0.91715325,1.9335464362,0.3494382533,"https://salsa.debian.org/python-team/packages/pyzor","https://github.com/SpamExperts/pyzor",5279.2096064815,6,19,1,17,10,0,0,24,4,"4",1.76,1.41666666666667 -"q2templates",-5.0482247015,-2.7964556336,-5.4769511928,"https://salsa.debian.org/med-team/q2templates","https://github.com/qiime2/q2templates.git",2619.2390393519,9,8,0,13,13,0,0,15,1,"1",1.47058823529412,1.86666666666667 -"q4wine-debian",-0.1511094825,0.0770464397,-0.2120059522,"https://github.com/tehnick/q4wine-debian","https://github.com/tehnick/q4wine-debian",4144.3286111111,0,1,0,1,0,0,0,1,3,"3",2,1 -"qconf",-0.3811268622,1.6595217121,-0.7762847478,"https://salsa.debian.org/qt-kde-team/extras/qconf","https://github.com/psi-im/qconf.git",5624.6740740741,1,15,0,7,13,0,0,13,4,"4",1.9375,2 -"qdacco",-1.6662726628,-0.4610104246,-2.0217074624,"https://salsa.debian.org/debian/qdacco","https://github.com/cpina/qdacco.git",5691.2413541667,1,6,0,1,5,0,0,5,4,"4",1.85714285714286,2 -"qemuctl",1.3474122059,3.3653108214,0.3818068479,"https://github.com/operatornormal/qemuctl","https://github.com/operatornormal/qemuctl",627.1595486111,3,2,0,1,0,0,0,1,1,"1",1.4,1 -"qjoypad",0.8529794114,3.2612636032,-0.0822850011,"https://github.com/kilobyte/qjoypad/tree/debian","https://github.com/kilobyte/qjoypad",4422.6630092593,2,12,0,10,1,0,0,11,3,"3",1.85714285714286,1.09090909090909 -"qmenu",0.2416596829,3.6062250713,-0.9305566725,"https://github.com/teopost/qmenu","https://github.com/teopost/qmenu",3121.65625,0,12,2,5,5,0,0,6,2,"2",2,1.83333333333333 -"qmidiarp",0.1060884453,2.4093772481,-0.4462133548,"https://salsa.debian.org/multimedia-team/qmidiarp","https://github.com/emuse/qmidiarp.git",5041.9955208333,2,10,0,5,12,0,0,16,4,"4",1.83333333333333,1.75 -"qmidinet",0.3987634563,2.3272584853,-0.2919992565,"https://salsa.debian.org/multimedia-team/qmidinet","https://github.com/rncbc/qmidinet.git",4992.0509143519,1,11,0,4,10,0,0,11,4,"4",1.91666666666667,1.90909090909091 -"qsampler",0.22306551,2.8539174302,-0.5046019625,"https://salsa.debian.org/multimedia-team/qsampler","https://github.com/rncbc/qsampler.git",5737.9962847222,3,14,0,5,5,0,0,7,4,"4",1.82352941176471,1.71428571428571 -"qsynth",0.1425312579,0.7343171417,-0.1064510745,"https://salsa.debian.org/multimedia-team/qsynth","https://github.com/rncbc/qsynth.git",5674.9236458333,3,19,0,7,24,0,0,25,4,"4",1.86363636363636,1.96 -"qtads",0.5108490252,2.4840737536,-0.3393338609,"https://salsa.debian.org/games-team/qtads","https://github.com/realnc/qtads.git",4788.6839583333,5,7,0,10,20,0,0,22,3,"3",1.58333333333333,1.90909090909091 -"qterm",-0.9155978148,-0.4024112301,-1.1525455527,"https://salsa.debian.org/chinese-team/qterm","https://github.com/qterm/qterm",4614.8412384259,1,8,0,4,17,0,1,18,3,"3",1.88888888888889,1.94444444444444 -"ChemmineR",-4.9478723057,-2.463477009,-5.4701350553,"https://salsa.debian.org/r-pkg-team/r-bioc-chemminer","https://github.com/girke-lab/ChemmineR.git",5502.0317476852,2,22,0,10,19,0,0,26,4,"4",1.91666666666667,1.73076923076923 -"GenomicAlignments",-0.0620075073,2.2952168072,-0.6079488331,"https://salsa.debian.org/r-pkg-team/r-bioc-genomicalignments","https://github.com/Bioconductor/GenomicAlignments.git",3637.7668287037,1,21,0,13,35,0,0,39,2,"2",1.95454545454545,1.8974358974359 -"GenomicRanges",-0.3216038801,1.2623780689,-0.6013624703,"https://salsa.debian.org/r-pkg-team/r-bioc-genomicranges","https://github.com/Bioconductor/GenomicRanges.git",4977.821712963,4,35,0,17,53,0,0,59,3,"3",1.8974358974359,1.89830508474576 -"IRanges",-0.2732928737,0.9495069035,-0.572231786,"https://salsa.debian.org/r-pkg-team/r-bioc-iranges","https://github.com/Bioconductor/IRanges.git",5556.7386458333,4,26,0,13,28,0,0,34,4,"4",1.86666666666667,1.82352941176471 -"preprocessCore",-0.5732675432,1.6147898925,-1.0092066733,"https://salsa.debian.org/r-pkg-team/r-bioc-preprocesscore","https://github.com/bmbolstad/preprocessCore.git",2983.7131828704,0,24,0,9,24,0,0,29,2,"2",2,1.82758620689655 -"Rsamtools",-0.2310113342,1.6900769525,-0.6158536063,"https://salsa.debian.org/r-pkg-team/r-bioc-rsamtools","https://github.com/Bioconductor/Rsamtools.git",5200.0497569445,3,23,0,13,61,0,1,68,4,"4",1.88461538461538,1.89705882352941 -"S4Vectors",-0.0375813239,2.2525487662,-0.5982212588,"https://salsa.debian.org/r-pkg-team/r-bioc-s4vectors","https://github.com/Bioconductor/S4Vectors/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA -"XVector",-0.1488435412,2.1308487448,-0.5902275914,"https://salsa.debian.org/r-pkg-team/r-bioc-xvector","https://github.com/Bioconductor/XVector.git",3819.2003935185,0,10,0,5,3,0,0,7,3,"3",2,1.42857142857143 -"animation",-0.3515983765,2.1779345723,-0.9193080299,"https://salsa.debian.org/r-pkg-team/r-cran-animation","https://github.com/yihui/animation/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA -"arm",-0.2157734257,1.5269652897,-0.5053279666,"https://salsa.debian.org/r-pkg-team/r-cran-arm","https://github.com/suyusung/arm.git",2199.2741898148,0,4,0,2,20,0,0,20,1,"1",2,2 -"av",-3.30692254,-1.0664029566,-3.7499442887,"https://salsa.debian.org/r-pkg-team/r-cran-av","https://github.com/ropensci/av.git",1927.0685763889,2,3,0,3,37,0,0,37,1,"1",1.6,2 -"BBmisc",-0.0791867315,2.2103067426,-0.5239193282,"https://salsa.debian.org/r-pkg-team/r-cran-bbmisc","https://github.com/berndbischl/BBmisc/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA -"R-bitops",0.1812196348,2.5081885743,-0.2636167197,"https://salsa.debian.org/r-pkg-team/r-cran-bitops","https://github.com/mmaechler/R-bitops/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA -"bold",-0.3589941343,1.8830194903,-0.7984155261,"https://salsa.debian.org/r-pkg-team/r-cran-bold","https://github.com/ropensci/bold/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA -"crayon",0.2585448991,2.4711889525,-0.1898457145,"https://salsa.debian.org/r-pkg-team/r-cran-crayon","https://github.com/r-lib/crayon/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA -"data.table",0.2136711627,2.3818673171,-0.2205863845,"https://salsa.debian.org/r-pkg-team/r-cran-data.table","https://github.com/Rdatatable/data.table/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA -"lwgeom",0.0058180918,2.4188629892,-0.7327945006,"https://salsa.debian.org/r-pkg-team/r-cran-lwgeom","https://github.com/r-spatial/lwgeom/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA -"matrixcalc",0.635479198,4.3464268954,-0.3463558892,"https://salsa.debian.org/r-pkg-team/r-cran-matrixcalc","https://github.com/TomKellyGenetics/matrixcalc/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA -"mcmc",0.1542552699,2.7368602124,-0.4513098316,"https://salsa.debian.org/r-pkg-team/r-cran-mcmc","https://github.com/cjgeyer/mcmc/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA -"mice",-1.1703228936,1.1700115105,-1.5897791054,"https://salsa.debian.org/r-pkg-team/r-cran-mice","https://github.com/amices/mice/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA -"MNP",-0.0051235593,2.1439929564,-0.4400210306,"https://salsa.debian.org/r-pkg-team/r-cran-mnp","https://github.com/kosukeimai/MNP/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA -"nozzle",-2.8854861587,-0.5978017889,-3.3250463837,"https://salsa.debian.org/r-pkg-team/r-cran-nozzle.r1","https://github.com/parklab/nozzle.git",926.0286111111,0,1,0,1,13,0,0,13,1,"1",2,2 -"r-optparse",-0.2070927617,2.0241027782,-0.6422022567,"https://salsa.debian.org/r-pkg-team/r-cran-optparse","https://github.com/trevorld/r-optparse.git",3364.6461689815,0,11,0,2,23,0,0,23,2,"2",2,2 -"pbdZMQ",0.1891713681,3.4926433557,-0.7475172495,"https://salsa.debian.org/r-pkg-team/r-cran-pbdzmq","https://github.com/snoweye/pbdZMQ/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA -"plyr",0.2396916445,2.3397739545,-0.1920061376,"https://salsa.debian.org/r-pkg-team/r-cran-plyr","https://github.com/hadley/plyr/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA -"ps",0.1035877787,2.5492783444,-0.3466845119,"https://salsa.debian.org/r-pkg-team/r-cran-ps","https://github.com/r-lib/ps/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA -"pscl",0.7428074668,3.4473876545,-0.1554350642,"https://salsa.debian.org/r-pkg-team/r-cran-pscl","https://github.com/atahk/pscl/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA -"rcmdcheck",0.2146726991,2.6895020277,-0.3988188518,"https://salsa.debian.org/r-pkg-team/r-cran-rcmdcheck","https://github.com/r-Lib/rcmdcheck/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA -"rgenoud",-0.3488800713,2.0874491929,-0.9117194293,"https://salsa.debian.org/r-pkg-team/r-cran-rgenoud","https://github.com/JasjeetSekhon/rgenoud/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA -"ritis",-0.2993761764,1.9534734206,-0.7980064599,"https://salsa.debian.org/r-pkg-team/r-cran-ritis","https://github.com/ropensci/ritis.git",3983.0266666667,1,4,0,3,12,0,0,12,3,"3",1.8,2 -"rncl",-0.3371319454,1.9103735604,-0.7874553216,"https://salsa.debian.org/r-pkg-team/r-cran-rncl","https://github.com/fmichonneau/rncl/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA -"RPostgreSQL",0.1055240035,2.6128418992,-0.4853871285,"https://salsa.debian.org/r-pkg-team/r-cran-rpostgresql","https://github.com/tomoakin/RPostgreSQL/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA -"rprotobuf",-0.6366352318,1.6233621016,-1.07827539,"https://salsa.debian.org/r-pkg-team/r-cran-rprotobuf","https://github.com/eddelbuettel/rprotobuf/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA -"rredlist",-0.2938584635,2.0226834023,-0.7943140683,"https://salsa.debian.org/r-pkg-team/r-cran-rredlist","https://github.com/ropensci/rredlist/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA -"truncnorm",-0.0250364198,2.0343035584,-0.4668055836,"https://salsa.debian.org/r-pkg-team/r-cran-truncnorm","https://github.com/olafmersmann/truncnorm/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA -"r-utf8",0.4292727883,3.0821382028,-0.1776413564,"https://salsa.debian.org/r-pkg-team/r-cran-utf8","https://github.com/patperry/r-utf8/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA -"vcdExtra",-0.1359675027,2.0732853363,-0.5645165568,"https://salsa.debian.org/r-pkg-team/r-cran-vcdextra","https://github.com/friendly/vcdExtra.git",5383.4657523148,0,9,0,3,12,0,0,12,4,"4",2,2 -"vioplot",-0.5117688173,1.754135969,-0.9412408999,"https://salsa.debian.org/r-pkg-team/r-cran-vioplot","https://github.com/TomKellyGenetics/vioplot",2457.8733912037,2,6,0,3,10,0,0,11,1,"1",1.75,1.90909090909091 -"worrms",-0.5997090341,1.1419114747,-0.9334770127,"https://salsa.debian.org/r-pkg-team/r-cran-worrms","https://github.com/ropensci/worrms/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA -"Zelig",0.7234179385,3.5136261784,-0.1954309797,"https://salsa.debian.org/r-pkg-team/r-cran-zelig","https://github.com/IQSS/Zelig/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA -"radare2",-0.001835483,0.290941294,-0.1737536018,"https://salsa.debian.org/pkg-security-team/radare2","https://github.com/radareorg/radare2/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA -"radcli",0.8077891464,3.0284268528,0.04850184,"https://salsa.debian.org/debian/radcli","https://github.com/radcli/radcli",0.0082986111,10,25,0,19,27,0,0,35,1,"1",1.71428571428571,1.77142857142857 -"radium_compressor",0.1355972195,2.8572373451,-0.7243626073,"https://salsa.debian.org/multimedia-team/radium-compressor","https://github.com/kmatheussen/radium_compressor.git",2426.0817361111,0,1,0,1,4,0,0,4,1,"1",2,2 -"rainbow",-2.2315150038,-0.9649972127,-2.481288314,"https://salsa.debian.org/js-team/rainbow.js","https://github.com/ccampbell/rainbow/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA -"rake-compiler",-0.1765905828,1.968096231,-0.8991055528,"https://salsa.debian.org/ruby-team/rake-compiler","https://github.com/rake-compiler/rake-compiler/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA -"rapache",-1.9452855915,-0.2626388012,-2.421875321,"https://salsa.debian.org/r-pkg-team/rapache","https://github.com/jeffreyhorner/rapache.git",4155.5934953704,1,13,0,6,35,0,0,35,3,"3",1.92857142857143,2 -"raphael",0.6406275138,3.7045765255,-0.2507834388,"https://salsa.debian.org/debian/raphael","https://github.com/DmitryBaranovskiy/raphael/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA -"redmine_local_avatars",-1.4572727561,1.4827307788,-2.2601628352,"https://salsa.debian.org/debian/redmine-plugin-local-avatars","https://github.com/ncoders/redmine_local_avatars",3991.5587615741,3,11,0,9,47,0,0,48,3,"3",1.78571428571429,1.97916666666667 -"ree",0.455206434,2.7126650543,-0.2943021607,"https://salsa.debian.org/debian/ree","https://github.com/alexmyczko/ree",1112.0390740741,3,1,0,2,2,0,0,3,1,"1",1.25,1.66666666666667 -"remaster-iso",-2.0473516929,0.1202211372,-2.4770101415,"https://github.com/unixabg/remaster-iso","https://github.com/unixabg/remaster-iso",251.8044791667,1,3,0,3,5,0,0,5,1,"1",1.75,2 -"python-requests-aws",-0.7617204879,2.8252172293,-1.7279435269,"https://salsa.debian.org/python-team/packages/requests-aws","https://github.com/tax/python-requests-aws",1319.2575,2,12,1,8,18,0,0,18,1,"1",1.85714285714286,2 -"rerun",-0.4314612854,3.3152754481,-1.4987677111,"https://salsa.debian.org/ruby-team/rerun","https://github.com/alexch/rerun/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA -"resvg",-0.8706965662,2.5429179421,-1.7032916571,"https://salsa.debian.org/debian/resvg","https://github.com/RazrFalcon/resvg.git",2182.7898726852,46,8,0,47,30,0,0,65,1,"1",1.14814814814815,1.46153846153846 -"rexical",-1.8414750192,0.9895052788,-2.7520386326,"https://salsa.debian.org/ruby-team/rexical","https://github.com/tenderlove/rexical",5447.083912037,2,10,0,9,23,0,2,29,4,"4",1.83333333333333,1.79310344827586 -"ripe-atlas-cousteau",-0.9764944882,1.3924863314,-1.4702991314,"https://salsa.debian.org/python-team/packages/ripe-atlas-cousteau","https://github.com/RIPE-NCC/ripe-atlas-cousteau.git",3286.9945949074,5,15,0,13,37,0,0,39,2,"2",1.75,1.94871794871795 -"robocut",-0.2824151439,2.3754574352,-1.0923195505,"https://github.com/alpharesearch/robocut","https://github.com/alpharesearch/robocut",831.4363194444,0,6,0,3,0,0,0,3,1,"1",2,1 -"robotfindskitten-pkg-debian",0.0179376982,1.3078276454,-0.485626997,"https://github.com/rfinnie/robotfindskitten-pkg-debian","https://github.com/rfinnie/robotfindskitten-pkg-debian",1629.5291319445,3,1,0,3,0,0,0,3,1,"1",1.25,1 -"rolo",-0.0498132259,2.1330027792,-0.8216828066,"https://salsa.debian.org/debian/rolo","https://github.com/libvc/rolo",1738.2993634259,2,2,0,2,2,0,0,2,1,"1",1.5,2 -"rospack",-0.2414662592,1.0688853941,-0.5553517117,"https://salsa.debian.org/science-team/ros-rospack","https://github.com/ros/rospack.git",3438.9073958333,20,26,0,26,22,0,0,42,2,"2",1.56521739130435,1.52380952380952 -"rospkg",-0.0548646672,1.8580305855,-0.5008277906,"https://salsa.debian.org/science-team/ros-rospkg","https://github.com/ros-infrastructure/rospkg.git",4295.6529861111,33,59,0,64,29,0,0,79,3,"3",1.64130434782609,1.36708860759494 -"std_msgs",-0.0206690342,2.386166873,-0.5747059717,"https://salsa.debian.org/science-team/ros-std-msgs","https://github.com/ros/std_msgs.git",3274.7244560185,3,17,0,9,19,0,0,20,2,"2",1.85,1.95 -"rsh-redone",0.2434579926,2.4765843324,-0.7125516261,"https://salsa.debian.org/debian/rsh-redone","https://github.com/gsliepen/rsh-redone",3762.4461458333,1,2,0,2,0,0,0,2,2,"2",1.66666666666667,1 -"rt-extension-repeatticket",-1.2713455525,2.448057755,-2.2206005858,"https://salsa.debian.org/request-tracker-team/rt-extension-repeatticket","https://github.com/bestpractical/rt-extension-repeatticket",4204.3307407408,0,5,0,4,3,0,0,7,3,"3",2,1.42857142857143 -"rtkit",1.5914934939,3.4753341698,0.6818583583,"https://salsa.debian.org/multimedia-team/rtkit","https://github.com/heftig/rtkit",3958.7431828704,18,3,0,13,43,0,0,51,3,"3",1.14285714285714,1.84313725490196 -"actionpack-action_caching",-0.0195395793,2.0209197518,-0.4608551365,"https://salsa.debian.org/ruby-team/ruby-actionpack-action-caching","https://github.com/rails/actionpack-action_caching/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA -"actionpack-page_caching",-2.0979772282,1.0629868716,-2.9170878445,"https://salsa.debian.org/ruby-team/ruby-actionpack-page-caching","https://github.com/rails/actionpack-page_caching/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA -"bacon",-1.4997697176,0.69875474,-2.0358441625,"https://salsa.debian.org/ruby-team/ruby-bacon","https://github.com/leahneukirchen/bacon",5364.0763657407,3,17,0,13,38,0,0,42,4,"4",1.85,1.9047619047619 -"base62",-3.2007890763,-0.5710294937,-3.7408477417,"https://salsa.debian.org/ruby-team/ruby-base62","https://github.com/jtzemp/base62.git",1973.6897222222,1,5,0,3,13,0,1,15,1,"1",1.83333333333333,1.86666666666667 -"batch-loader",-1.39118114,1.051907531,-1.9658421191,"https://salsa.debian.org/ruby-team/ruby-batch-loader","https://github.com/exAspArk/batch-loader/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA -"bcrypt-ruby",-0.1670366207,2.5485813659,-0.7840534303,"https://salsa.debian.org/ruby-team/ruby-bcrypt","https://github.com/bcrypt-ruby/bcrypt-ruby/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA -"ruby-beautify",-1.8179395924,0.5723544617,-2.4288221334,"https://salsa.debian.org/ruby-team/ruby-beautify.git","https://github.com/erniebrodeur/ruby-beautify",2708.0809837963,1,19,0,16,45,0,0,50,1,"1",1.95,1.9 -"bogus",-2.97011868,-1.1536023268,-3.3242631007,"https://salsa.debian.org/ruby-team/ruby-bogus","https://github.com/psyho/bogus/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA -"bootsnap",0.4969446581,4.0467699375,-0.4453655481,"https://salsa.debian.org/ruby-team/ruby-bootsnap","https://github.com/Shopify/bootsnap/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA -"mongo-ruby-driver",-0.4876456206,1.8841260262,-1.1170056726,"https://salsa.debian.org/ruby-team/ruby-bson","https://github.com/mongodb/mongo-ruby-driver/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA -"buff-config",-2.0406131429,-0.5802367653,-2.3469509456,"https://salsa.debian.org/ruby-team/ruby-buff-config","https://github.com/berkshelf/buff-config/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA -"buff-extensions",-1.7001314331,0.6961340583,-2.1479955125,"https://salsa.debian.org/ruby-team/ruby-buff-extensions","https://github.com/RiotGames/buff-extensions",1162.5226851852,0,5,0,3,12,0,0,12,1,"1",2,2 -"builder",0.2891790514,2.0567550581,-0.1483490017,"https://salsa.debian.org/ruby-team/ruby-builder","https://github.com/tenderlove/builder/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA -"byebug",0.1180553967,2.3001711673,-0.3220977863,"https://salsa.debian.org/ruby-team/ruby-byebug","https://github.com/deivid-rodriguez/byebug/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA -"capture-output",-2.8922262934,-0.7342713061,-3.3221878931,"https://salsa.debian.org/ruby-team/ruby-capture-output","https://github.com/jpastuszek/capture-output",0.0173611111,0,1,0,1,1,0,0,2,1,"1",2,1.5 -"capybara",0.2496990629,2.4303429017,-0.4282559769,"https://salsa.debian.org/ruby-team/ruby-capybara","https://github.com/teamcapybara/capybara/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA -"cassiopee",-1.5851518029,1.3271244261,-2.3664077484,"https://salsa.debian.org/ruby-team/ruby-cassiopee","https://github.com/osallou/cassiopee/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA -"celluloid",0.0913806587,1.1865611887,-0.2892192569,"https://salsa.debian.org/ruby-team/ruby-celluloid","https://github.com/celluloid/celluloid/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA -"certificate_authority",-2.001867048,0.4618631999,-2.7039312007,"https://salsa.debian.org/ruby-team/ruby-certificate-authority","https://github.com/cchandler/certificate_authority/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA -"cmdparse",0.6782564731,4.5071204079,-0.416431913,"https://salsa.debian.org/ruby-team/ruby-cmdparse","https://github.com/gettalong/cmdparse/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA -"color",-1.6594930763,0.7881397104,-2.2203703357,"https://salsa.debian.org/ruby-team/ruby-color","https://github.com/halostatue/color",4994.1460185185,1,11,1,4,30,0,0,30,4,"4",1.91666666666667,2 -"colorator",0.17562997,2.3024347781,-0.2637255242,"https://salsa.debian.org/ruby-team/ruby-colorator","https://github.com/octopress/colorator/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA -"combustion",-2.7077626864,-0.5070219842,-3.2814670287,"https://salsa.debian.org/ruby-team/ruby-combustion","https://github.com/pat/combustion/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA -"commander",-0.3544313341,2.5524463745,-1.091065268,"https://salsa.debian.org/ruby-team/ruby-commander","https://github.com/commander-rb/commander/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA -"connection_pool",-0.107782789,2.7608316302,-0.9083898684,"https://salsa.debian.org/ruby-team/ruby-connection-pool","https://github.com/mperham/connection_pool/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA -"coveralls-ruby",-1.0639842925,0.6886883657,-1.6214631931,"https://salsa.debian.org/ruby-team/ruby-coveralls","https://github.com/lemurheavy/coveralls-ruby/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA -"crb-blast",-0.6967501476,1.5636879643,-1.4854285145,"https://salsa.debian.org/ruby-team/ruby-crb-blast","https://github.com/cboursnell/crb-blast",1070.1020717593,0,5,0,2,15,0,0,15,1,"1",2,2 -"css_parser",0.4702988432,3.0731837512,-0.226276662,"https://salsa.debian.org/ruby-team/ruby-css-parser","https://github.com/premailer/css_parser/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA -"curb",-0.9519936286,0.5852000443,-1.3702997899,"https://salsa.debian.org/ruby-team/ruby-curb","https://github.com/taf2/curb/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA -"dalli",-0.7493522151,1.7345835465,-1.4848953309,"https://salsa.debian.org/ruby-team/ruby-dalli","https://github.com/petergoldstein/dalli/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA -"eim_xml",-0.7146782347,2.4094998812,-1.5508131873,"https://salsa.debian.org/ruby-team/ruby-eim-xml","https://github.com/hirakuro/eim_xml/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA -"em-http-request",-0.182257018,2.1432197933,-1.011053135,"https://salsa.debian.org/ruby-team/ruby-em-http-request","https://github.com/igrigorik/em-http-request/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA -"em-redis",-2.4322275314,0.3220252422,-3.2383595542,"https://salsa.debian.org/ruby-team/ruby-em-redis","https://github.com/libc/em-redis",3058.3058101852,3,10,0,6,7,0,0,10,2,"2",1.76923076923077,1.7 -"encryptor",0.4811221705,4.0560529867,-0.7455390491,"https://salsa.debian.org/ruby-team/ruby-encryptor","https://github.com/attr-encrypted/encryptor",2635.9583564815,1,9,0,5,53,0,0,54,1,"1",1.9,1.98148148148148 -"entypo-rails",0.5391017786,4.3530001784,-0.5148206393,"https://salsa.debian.org/ruby-team/ruby-entypo-rails","https://github.com/lwe/entypo-rails",1757.4358333333,1,10,0,7,20,0,0,20,1,"1",1.90909090909091,2 -"enumerize",-3.5842960195,-1.0600757701,-4.2631150762,"https://salsa.debian.org/ruby-team/ruby-enumerize","https://github.com/brainspec/enumerize/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA -"escape_utils",-0.3520723582,1.3204538371,-0.8030228346,"https://salsa.debian.org/ruby-team/ruby-escape-utils","https://github.com/brianmario/escape_utils.git",4731.6076041667,5,24,0,25,33,0,0,45,3,"3",1.82758620689655,1.73333333333333 -"espeak-ruby",-0.7286751247,2.0352078637,-1.4874218872,"https://salsa.debian.org/ruby-team/ruby-espeak","https://github.com/dejan/espeak-ruby/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA -"ethon",-0.0042860534,2.2301309151,-0.5633876951,"https://salsa.debian.org/ruby-team/ruby-ethon","https://github.com/typhoeus/ethon/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA -"excon",0.3241647951,2.1161660144,-0.1827284225,"https://salsa.debian.org/ruby-team/ruby-excon","https://github.com/excon/excon/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA -"execjs",0.8128959283,3.6876363054,-0.0541606598,"https://salsa.debian.org/ruby-team/ruby-execjs","https://github.com/rails/execjs/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA -"factory_bot",-2.8031110385,-0.7539374887,-3.2965562449,"https://salsa.debian.org/ruby-team/ruby-factory-bot","https://github.com/thoughtbot/factory_bot/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA -"factory_bot_rails",-4.3362753842,-1.1849251406,-5.2964482175,"https://salsa.debian.org/ruby-team/ruby-factory-bot-rails","https://github.com/thoughtbot/factory_bot_rails/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA -"faker",-2.043268084,0.4558232112,-2.7260545607,"https://salsa.debian.org/ruby-team/ruby-faker","https://github.com/faker-ruby/faker/issues/new",2746.3319791667,2,17,0,0,0,0,0,881,2,"2",1.89473684210526,1 -"ruby-fcgi-ng",0.3005043747,2.2153527182,-0.3456056618,"https://salsa.debian.org/ruby-team/ruby-fcgi","https://github.com/alphallc/ruby-fcgi-ng",3559.9222685185,1,6,0,5,7,0,0,7,2,"2",1.85714285714286,2 -"ferret",-1.152482197,0.9802706874,-1.8377454457,"https://salsa.debian.org/ruby-team/ruby-ferret","https://github.com/dbalmain/ferret/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA -"ffaker",-2.5489714355,0.5028353652,-3.5038139593,"https://salsa.debian.org/ruby-team/ruby-ffaker","https://github.com/ffaker/ffaker/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA -"ffi",0.7507411929,2.0786767636,0.1677842861,"https://salsa.debian.org/ruby-team/ruby-ffi","https://github.com/ffi/ffi/wiki/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA -"ffi-rzmq",-1.7723964358,0.1072926119,-2.431946797,"https://salsa.debian.org/ruby-team/ruby-ffi-rzmq","https://github.com/chuckremes/ffi-rzmq",3424.7133912037,1,37,0,26,23,0,0,39,2,"2",1.97368421052632,1.58974358974359 -"filepath",-2.3053481268,0.1409903961,-2.9510491569,"https://salsa.debian.org/ruby-team/ruby-filepath","https://github.com/gioele/filepath/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA -"fission",-1.6562095743,0.8388115306,-2.2192481171,"https://salsa.debian.org/ruby-team/ruby-fission","https://github.com/thbishop/fission",876.3192708333,0,10,0,7,20,0,0,20,1,"1",2,2 -"flexmock",-0.3454878367,2.571112926,-1.0719182939,"https://salsa.debian.org/ruby-team/ruby-flexmock","https://github.com/doudou/flexmock/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA -"fog-core",0.6091506734,3.4479009172,-0.153332088,"https://salsa.debian.org/ruby-team/ruby-fog-core","https://github.com/fog/fog-core/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA -"fog-local",-0.5604968871,1.9424075855,-1.1725410205,"https://salsa.debian.org/ruby-team/ruby-fog-local","https://github.com/fog/fog-local",5023.4471759259,4,29,0,20,20,0,0,31,4,"4",1.87878787878788,1.64516129032258 -"graffiti",-1.4846935384,1.5503379929,-2.3930105658,"https://salsa.debian.org/ruby-team/ruby-graffiti","https://github.com/angdraug/graffiti",3536.2679166667,0,3,0,1,2,0,0,2,2,"2",2,2 -"grape",-0.4350415295,1.4006419917,-1.070629589,"https://salsa.debian.org/ruby-team/ruby-grape","https://github.com/ruby-grape/grape/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA -"Ruby-Graphviz",-0.281553724,2.1524260723,-1.1267460692,"https://salsa.debian.org/ruby-team/ruby-graphviz","https://github.com/glejeune/Ruby-Graphviz/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA -"rb-gsl",-0.3230766707,0.701457517,-0.7464638333,"https://salsa.debian.org/ruby-team/ruby-gsl","https://github.com/SciRuby/rb-gsl/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA -"haml",-0.2288560111,0.7789985582,-0.5585413968,"https://salsa.debian.org/ruby-team/ruby-haml","https://github.com/haml/haml/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA -"haml-rails",-1.7986736177,0.2769400484,-2.4010715421,"https://salsa.debian.org/ruby-team/ruby-haml-rails","https://github.com/haml/haml-rails/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA -"hamster",0.1910108771,2.6568022387,-0.3608024404,"https://salsa.debian.org/ruby-team/ruby-hamster","https://github.com/hamstergem/hamster/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA -"hangouts-chat",-1.2144339097,0.4818108524,-1.5637566918,"https://salsa.debian.org/ruby-team/ruby-hangouts-chat","https://github.com/enzinia/hangouts-chat",1065.9778472222,3,4,0,3,4,0,0,4,1,"1",1.57142857142857,2 -"hashie",0.5722550457,3.4085323574,-0.2355411618,"https://salsa.debian.org/ruby-team/ruby-hashie","https://github.com/hashie/hashie/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA -"highline",0.2453167047,2.4988399297,-0.2235846904,"https://salsa.debian.org/ruby-team/ruby-highline","https://github.com/JEG2/highline/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA -"hitimes",0.1068100876,2.6613098357,-0.447701455,"https://salsa.debian.org/ruby-team/ruby-hitimes","https://github.com/copiousfreetime/hitimes/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA -"html-pipeline",-0.3782141806,2.4999259043,-1.1470246908,"https://salsa.debian.org/ruby-team/ruby-html-pipeline","https://github.com/jch/html-pipeline",4034.7769328704,33,88,0,93,41,0,0,110,3,"3",1.72727272727273,1.37272727272727 -"html2haml",-0.284722491,1.1708771552,-0.6449129827,"https://salsa.debian.org/ruby-team/ruby-html2haml","https://github.com/haml/html2haml/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA -"httparty",-0.2296319294,1.8101133693,-0.8217200797,"https://salsa.debian.org/ruby-team/ruby-httparty","https://github.com/jnunemaker/httparty/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA -"i18n",0.8152415757,2.7696084069,0.1031413415,"https://salsa.debian.org/ruby-team/ruby-i18n","https://github.com/ruby-i18n/i18n/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA -"i18n-inflector-rails",-3.6101910392,-1.2035908486,-4.2660614395,"https://salsa.debian.org/ruby-team/ruby-i18n-inflector-rails","https://github.com/siefca/i18n-inflector-rails/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA -"icalendar",-0.9967703811,1.7616614381,-1.7133045592,"https://salsa.debian.org/ruby-team/ruby-icalendar","https://github.com/icalendar/icalendar/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA -"ice_cube",-2.9447850831,0.3245689035,-3.696715811,"https://salsa.debian.org/ruby-team/ruby-ice-cube","http://seejohnrun.github.com/ice_cube/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA -"image_science",-0.6109855428,1.3356911263,-1.2647438358,"https://salsa.debian.org/ruby-team/ruby-image-science","https://github.com/seattlerb/image_science/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA -"influxdb-ruby",0.0573197432,3.227120433,-0.9690594839,"https://salsa.debian.org/ruby-team/ruby-influxdb","https://github.com/InfluxCommunity/influxdb-ruby/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA -"inherited_resources",-4.4805244395,-1.6125821355,-5.323696982,"https://salsa.debian.org/ruby-team/ruby-inherited-resources","https://github.com/activeadmin/inherited_resources/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA -"rubyinline",-0.5488463078,1.586460929,-1.1539952628,"https://salsa.debian.org/ruby-team/ruby-inline","https://github.com/seattlerb/rubyinline.git",5600.4261805556,0,4,0,3,40,0,0,40,4,"4",2,2 -"innertube",-0.8869903201,1.6021467977,-1.6544158523,"https://salsa.debian.org/ruby-team/ruby-innertube","https://github.com/basho/innertube.git",1008.2290162037,0,4,0,4,8,0,0,8,1,"1",2,2 -"ipaddress",0.3785874101,3.1933979431,-0.2196161692,"https://salsa.debian.org/ruby-team/ruby-ipaddress","https://github.com/bluemonk/ipaddress/issues/new",2746.3319791667,2,17,0,0,0,0,0,56,2,"2",1.89473684210526,1 -"jar-dependencies",0.0460603946,2.8173117768,-0.7407876075,"https://salsa.debian.org/ruby-team/ruby-jar-dependencies","https://github.com/mkristian/jar-dependencies",3114.2440277778,4,15,0,15,42,0,1,45,2,"2",1.78947368421053,1.93333333333333 -"jekyll-commonmark",-3.9057611496,-1.6518132292,-4.3433705046,"https://salsa.debian.org/ruby-team/ruby-jekyll-commonmark","https://github.com/jekyll/jekyll-commonmark/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA -"jekyll-feed",0.1675771135,2.2494684672,-0.2627259539,"https://salsa.debian.org/ruby-team/ruby-jekyll-feed","https://github.com/jekyll/jekyll-feed/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA -"joiner",-0.899573388,2.1329741465,-1.7030771732,"https://salsa.debian.org/ruby-team/ruby-joiner","https://github.com/pat/joiner/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA -"jquery-atwho-rails",-0.7423375517,1.4980767196,-1.2841911773,"https://salsa.debian.org/ruby-team/ruby-jquery-atwho-rails","https://github.com/ichord/jquery-atwho-rails/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA -"locale",0.3803802231,1.524276319,-0.0365821889,"https://salsa.debian.org/ruby-team/ruby-locale","https://github.com/ruby-gettext/locale/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA -"magic",-0.136206368,2.210685595,-0.7957036211,"https://salsa.debian.org/ruby-team/ruby-magic","https://github.com/qoobaa/magic",2808.4621990741,0,9,0,5,8,0,0,8,2,"2",2,2 -"mail-gpg",-0.9409015952,1.9853520354,-1.675246259,"https://salsa.debian.org/ruby-team/ruby-mail-gpg","https://github.com/jkraemer/mail-gpg",4267.9559722222,18,136,0,11,30,0,0,30,3,"3",1.88311688311688,2 -"markdown-it-html5-embed",-2.8648647448,0.5943602868,-3.688121554,"https://salsa.debian.org/ruby-team/ruby-markdown-it-html5-embed","https://github.com/cmrd-senya/markdown-it-html5-embed",2489.0705555556,3,10,0,7,15,0,0,15,1,"1",1.76923076923077,2 -"maxitest",-2.3507463091,0.2011168043,-2.9821664947,"https://salsa.debian.org/ruby-team/ruby-maxitest","https://github.com/grosser/maxitest",3302.3780092593,0,10,0,6,20,0,0,20,2,"2",2,2 -"method_source",0.3967690887,3.2318024051,-0.2913605087,"https://salsa.debian.org/ruby-team/ruby-method-source","https://github.com/banister/method_source",3988.6090393519,4,19,0,20,55,0,0,56,3,"3",1.82608695652174,1.98214285714286 -"ruby-mime-types",0.3717629365,2.6878654539,-0.1300864966,"https://salsa.debian.org/ruby-team/ruby-mime-types","https://github.com/mime-types/ruby-mime-types/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA -"minimagick",-1.0439670842,0.2157840612,-1.3997145193,"https://salsa.debian.org/ruby-team/ruby-mini-magick","https://github.com/minimagick/minimagick/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA -"minitar",-0.0660695838,1.7554167483,-0.5639163741,"https://salsa.debian.org/ruby-team/ruby-minitar","https://github.com/halostatue/minitar",5658.6576851852,8,6,1,8,33,0,0,33,4,"4",1.42857142857143,2 -"minitest",0.6291543197,3.2530425688,0.0059259645,"https://salsa.debian.org/ruby-team/ruby-minitest","https://github.com/seattlerb/minitest/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA -"minitest-around",-1.7698068776,0.7510788114,-2.5114054563,"https://salsa.debian.org/ruby-team/ruby-minitest-around","https://github.com/splattael/minitest-around",2552.4467708333,2,14,0,7,17,0,0,17,1,"1",1.875,2 -"minitest-shared_description",-3.2057434289,-0.7536793446,-3.735520243,"https://salsa.debian.org/ruby-team/ruby-minitest-shared-description","https://github.com/jeremyevans/minitest-shared_description",2605.2266666667,0,2,0,2,2,0,0,2,1,"1",2,2 -"mixlib-install",-0.6385298321,2.1889207953,-1.4847448361,"https://salsa.debian.org/ruby-team/ruby-mixlib-install","https://github.com/chef/mixlib-install/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA -"mocha",-0.0854006271,1.5328416557,-0.5865753787,"https://salsa.debian.org/ruby-team/ruby-mocha","https://github.com/freerange/mocha/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA -"mousetrap-rails",-0.5414473391,2.2995115053,-1.3022888739,"https://salsa.debian.org/ruby-team/ruby-mousetrap-rails","https://github.com/kugaevsky/mousetrap-rails",2627.8625810185,0,4,0,3,14,0,2,16,1,"1",2,1.875 -"mustache",0.3863898236,2.9819707709,-0.4052274614,"https://salsa.debian.org/ruby-team/ruby-mustache","https://github.com/defunkt/mustache",4729.4908680556,23,58,1,62,26,0,0,84,3,"3",1.71604938271605,1.30952380952381 -"mysql2",0.3134512975,1.4731032493,-0.1330082155,"https://salsa.debian.org/ruby-team/ruby-mysql2","https://github.com/brianmario/mysql2",4877.8413194445,60,107,4,128,39,0,0,163,3,"3",1.64071856287425,1.23926380368098 -"net-sftp",0.512822573,2.6427692706,-0.1200757583,"https://salsa.debian.org/ruby-team/ruby-net-sftp","https://github.com/net-ssh/net-sftp/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA -"net-ssh",0.3423712483,1.5708505632,-0.0962002825,"https://salsa.debian.org/ruby-team/ruby-net-ssh","https://github.com/net-ssh/net-ssh/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA -"net-ssh-gateway",0.0949247841,2.4061879488,-0.3883582933,"https://salsa.debian.org/ruby-team/ruby-net-ssh-gateway","https://github.com/net-ssh/net-ssh-gateway/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA -"netrc",0.6689404268,3.5600163117,-0.1237597689,"https://salsa.debian.org/ruby-team/ruby-netrc","https://github.com/heroku/netrc",3633.5661342593,0,30,0,18,43,0,0,45,2,"2",2,1.95555555555556 -"nokogiri",0.0984970577,0.7468154749,-0.1063244283,"https://salsa.debian.org/ruby-team/ruby-nokogiri","https://github.com/sparklemotion/nokogiri/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA -"rubyntlm",-0.0624150923,2.5862392951,-0.7205122229,"https://salsa.debian.org/ruby-team/ruby-ntlm","https://github.com/winrb/rubyntlm/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA -"oauth-ruby",0.0832778896,2.8453147176,-0.5926012173,"https://salsa.debian.org/ruby-team/ruby-oauth","https://github.com/oauth-xx/oauth-ruby",5341.0796643519,47,77,3,86,0,0,0,86,4,"4",1.62096774193548,1 -"oauth2",-0.165607622,2.3195911932,-0.9005135088,"https://salsa.debian.org/ruby-team/ruby-oauth2","https://github.com/intridea/oauth2",4856.2432986111,41,112,2,108,0,0,0,108,3,"3",1.73202614379085,1 -"oily_png",0.1453183816,3.1507405338,-0.7131154739,"https://salsa.debian.org/ruby-team/ruby-oily-png","https://github.com/wvanbergen/oily_png/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA -"oj",0.2009601344,1.5648205522,-0.1380338639,"https://salsa.debian.org/ruby-team/ruby-oj","https://github.com/ohler55/oj/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA -"ruby-ole",-0.6621692167,1.4303576538,-1.3055179465,"https://salsa.debian.org/ruby-team/ruby-ole","https://github.com/aquasync/ruby-ole/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA -"omniauth-cas3",-0.5952547028,1.8217576227,-1.2467001517,"https://salsa.debian.org/ruby-team/ruby-omniauth-cas3","https://github.com/tduehr/omniauth-cas3",3904.2384027778,7,20,0,16,5,0,0,17,3,"3",1.74074074074074,1.29411764705882 -"omniauth_crowd",-0.5393910023,2.0196041023,-1.2327402235,"https://salsa.debian.org/ruby-team/ruby-omniauth-crowd","https://github.com/robdimarco/omniauth_crowd",3405.9749189815,0,18,0,7,22,0,1,23,2,"2",2,1.95652173913043 -"pdf-core",0.4904301487,3.0385774309,-0.1720936555,"https://salsa.debian.org/ruby-team/ruby-pdf-core","https://github.com/prawnpdf/pdf-core",3635.7233912037,6,16,0,15,46,0,0,47,2,"2",1.72727272727273,1.97872340425532 -"ruby-pgplot",-2.6363964332,-2.1680994385,-2.777770353,"https://salsa.debian.org/ruby-team/ruby-pgplot","https://github.com/masa16/ruby-pgplot",1430.3931597222,0,3,0,2,0,0,0,2,1,"1",2,1 -"pkg-config",0.3988956635,1.8385888168,-0.0542821557,"https://salsa.debian.org/ruby-team/ruby-pkg-config","https://github.com/ruby-gnome/pkg-config/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA -"powerpack",-0.1934084944,2.1339641007,-0.895456645,"https://salsa.debian.org/ruby-team/ruby-powerpack","https://github.com/bbatsov/powerpack.git",2684.7776041667,4,14,0,13,29,0,0,29,1,"1",1.77777777777778,2 -"premailer",-0.5173304375,2.1881663412,-1.1678917683,"https://salsa.debian.org/ruby-team/ruby-premailer","https://github.com/premailer/premailer",5001.0799884259,26,100,0,91,2,0,19,111,4,"4",1.79365079365079,1.01801801801802 -"ruby-progressbar",0.8495085041,3.8284313345,-0.1583697084,"https://salsa.debian.org/ruby-team/ruby-progressbar","https://github.com/jfelchner/ruby-progressbar/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA -"psych",0.1356905572,2.4813899471,-0.6287647557,"https://salsa.debian.org/ruby-team/ruby-psych","https://github.com/ruby/psych/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA -"puppet-syntax",-1.4274929514,0.597721473,-2.0050274993,"https://salsa.debian.org/ruby-team/ruby-puppet-syntax","https://github.com/voxpupuli/puppet-syntax/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA -"puppetlabs_spec_helper",-1.7074456885,0.8017468129,-2.3846811973,"https://salsa.debian.org/ruby-team/ruby-puppetlabs-spec-helper","https://github.com/puppetlabs/puppetlabs_spec_helper/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA -"rabl-rails",-0.911642608,0.5957511596,-1.2777176183,"https://salsa.debian.org/ruby-team/ruby-rabl-rails","https://github.com/ccocchi/rabl-rails/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA -"rack-google-analytics",-2.1861215386,0.6392727132,-2.9350136773,"https://salsa.debian.org/ruby-team/ruby-rack-google-analytics","https://github.com/kangguru/rack-google-analytics",1720.5543634259,2,20,0,17,54,0,0,56,1,"1",1.90909090909091,1.96428571428571 -"rack-oauth2",-0.4998111729,2.3524970457,-1.2089369245,"https://salsa.debian.org/ruby-team/ruby-rack-oauth2","https://github.com/nov/rack-oauth2/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA -"rack-test",0.1859803919,2.3863075108,-0.2515547357,"https://salsa.debian.org/ruby-team/ruby-rack-test","https://github.com/rack/rack-test/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA -"highlightjs",-1.776057653,0.676887867,-2.5692038823,"https://salsa.debian.org/ruby-team/ruby-rails-assets-highlightjs","https://github.com/components/highlightjs",2389.9739467593,1,13,0,13,40,0,0,41,1,"1",1.92857142857143,1.97560975609756 -"jquery.fullscreen",-0.3069663717,3.425973806,-1.5023904978,"https://salsa.debian.org/ruby-team/ruby-rails-assets-jquery-fullscreen-plugin","https://github.com/private-face/jquery.fullscreen",928.6241898148,0,10,3,5,39,0,0,39,1,"1",2,2 -"rails-deprecated_sanitizer",0.511323457,3.2709347629,-0.2232233125,"https://salsa.debian.org/ruby-team/ruby-rails-deprecated-sanitizer","https://github.com/rails/rails-deprecated_sanitizer/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA -"retryable",-0.6091419167,3.2470945934,-1.7468533882,"https://salsa.debian.org/ruby-team/ruby-retryable","https://github.com/nfedyashev/retryable/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA -"riddle",-0.2213568731,2.8190792528,-1.302253646,"https://salsa.debian.org/ruby-team/ruby-riddle","https://github.com/pat/riddle/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA -"riot",-2.0988502373,0.6683400663,-2.9186141778,"https://salsa.debian.org/ruby-team/ruby-riot","https://github.com/thumblemonks/riot.git",3321.7834953704,13,21,0,20,33,0,7,43,2,"2",1.61764705882353,1.76744186046512 -"rmagick",1.1027033423,3.178542172,0.1881853373,"https://salsa.debian.org/ruby-team/ruby-rmagick","https://github.com/rmagick/rmagick/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA -"roadie",-0.1961366614,1.239631746,-0.5682337388,"https://salsa.debian.org/ruby-team/ruby-roadie","https://github.com/Mange/roadie/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA -"roadie-rails",0.2474719144,3.1899002451,-0.5277315026,"https://salsa.debian.org/ruby-team/ruby-roadie-rails","https://github.com/Mange/roadie-rails/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA -"roxml",-2.5839472744,-1.4732125607,-2.7933760266,"https://salsa.debian.org/ruby-team/ruby-roxml","https://github.com/Empact/roxml/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA -"rr",-1.121241691,1.6540401602,-1.8988612605,"https://salsa.debian.org/ruby-team/ruby-rr","https://github.com/rr/rr/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA -"rspec-its",0.3171416756,3.0292623369,-0.3872674482,"https://salsa.debian.org/ruby-team/ruby-rspec-its","https://github.com/rspec/rspec-its/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA -"rspec-puppet",-1.5750551856,-0.1277944687,-2.1032613755,"https://salsa.debian.org/ruby-team/ruby-rspec-puppet","https://github.com/rodjek/rspec-puppet/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA -"rspec-rails",-1.5844038432,-0.1606831019,-1.9538760382,"https://salsa.debian.org/ruby-team/ruby-rspec-rails","https://github.com/rspec/rspec-rails/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA -"rspec-retry",-2.3142070783,-0.3616680713,-2.7725056817,"https://salsa.debian.org/ruby-team/ruby-rspec-retry","https://github.com/NoRedInk/rspec-retry/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA -"ruby2ruby",-1.2632583004,0.5122103892,-1.7609454819,"https://salsa.debian.org/ruby-team/ruby-ruby2ruby","https://github.com/seattlerb/ruby2ruby.git",5438.8588773148,0,3,0,3,34,0,0,35,4,"4",2,1.97142857142857 -"rmail",0.7637470574,3.3946799515,-0.0798110938,"https://salsa.debian.org/ruby-team/ruby-rubymail","https://github.com/terceiro/rmail/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA -"rufus-scheduler",-0.6929292609,1.2502062176,-1.0955436307,"https://salsa.debian.org/ruby-team/ruby-rufus-scheduler","https://github.com/jmettraux/rufus-scheduler/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA -"rugged",0.1738858881,1.9747468959,-0.302862283,"https://salsa.debian.org/ruby-team/ruby-rugged","https://github.com/libgit2/rugged/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA -"safe_yaml",0.4923372454,2.4380212188,-0.0762986291,"https://salsa.debian.org/ruby-team/ruby-safe-yaml","https://github.com/dtao/safe_yaml/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA -"ruby-saml",-0.6292373352,1.4888690533,-1.2152677939,"https://salsa.debian.org/ruby-team/ruby-saml","https://github.com/onelogin/ruby-saml/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA -"sanitize",0.1142111133,2.7598362726,-0.6767036115,"https://salsa.debian.org/ruby-team/ruby-sanitize","https://github.com/rgrove/sanitize/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA -"sassc-rails",-1.8895893476,0.6543031358,-2.5458693661,"https://salsa.debian.org/ruby-team/ruby-sassc-rails","https://github.com/sass/sassc-rails/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA -"sdoc",0.2066194576,2.5352625368,-0.2819990512,"https://salsa.debian.org/ruby-team/ruby-sdoc","https://github.com/zzak/sdoc.git",5126.572337963,22,57,0,56,0,0,0,56,4,"4",1.72151898734177,1 -"seamless_database_pool",-2.1643107675,0.2260298985,-2.6118947494,"https://salsa.debian.org/ruby-team/ruby-seamless-database-pool","https://github.com/bdurand/seamless_database_pool/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA -"selenium",-0.2089568629,1.5489405973,-0.5373754091,"https://salsa.debian.org/ruby-team/ruby-selenium-webdriver","https://github.com/SeleniumHQ/selenium/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA -"semantic_puppet",-0.6229814617,0.8563700058,-0.9765203623,"https://salsa.debian.org/puppet-team/ruby-semantic-puppet","https://github.com/puppetlabs/semantic_puppet/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA -"sequel_pg",0.6191087607,3.8061270046,-0.2981530837,"https://salsa.debian.org/ruby-team/ruby-sequel-pg","https://github.com/jeremyevans/sequel_pg.git",4773.6626388889,4,7,0,9,45,0,0,47,3,"3",1.63636363636364,1.95744680851064 -"sexp_processor",0.2542094629,3.0388178614,-0.4829633288,"https://salsa.debian.org/ruby-team/ruby-sexp-processor","https://github.com/seattlerb/sexp_processor",5341.4177430556,0,2,0,1,26,0,0,26,4,"4",2,2 -"ruby-shadow",0.216126739,1.4890131453,-0.1154816196,"https://salsa.debian.org/ruby-team/ruby-shadow","https://github.com/apalmblad/ruby-shadow/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA -"sham_rack",-2.1608189217,0.0182643744,-2.8608854622,"https://salsa.debian.org/ruby-team/ruby-sham-rack","https://github.com/mdub/sham_rack",3267.7854166667,2,5,0,3,12,0,0,12,2,"2",1.71428571428571,2 -"simplecov",-0.3160772042,2.2007214999,-1.0026344512,"https://salsa.debian.org/ruby-team/ruby-simplecov","https://github.com/simplecov-ruby/simplecov/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA -"slim",-0.3918087088,1.09130624,-0.8384953408,"https://salsa.debian.org/ruby-team/ruby-slim","http://github.com/slim-template/slim//issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA -"soap4r-noeticpenguin",0.4756744398,2.1003291699,-0.0796726268,"https://salsa.debian.org/ruby-team/ruby-soap4r","https://github.com/noeticpenguin/soap4r-noeticpenguin/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA -"spring",0.1889684319,2.2582459747,-0.2755388783,"https://salsa.debian.org/ruby-team/ruby-spring","https://github.com/rails/spring/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA -"sprockets-rails",0.6272839018,2.9396554619,-0.1070486043,"https://salsa.debian.org/ruby-team/ruby-sprockets-rails","https://github.com/rails/sprockets-rails/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA -"tins",-0.0184774495,2.3442756527,-0.4994282993,"https://salsa.debian.org/ruby-team/ruby-tins","https://github.com/flori/tins.git",5186.4477893519,2,5,0,6,19,0,0,19,4,"4",1.71428571428571,2 -"toml",0.5450450103,3.0277601672,-0.1659943286,"https://salsa.debian.org/ruby-team/ruby-toml","https://github.com/jm/toml",3202.4776736111,3,24,1,21,69,0,0,69,2,"2",1.88888888888889,2 -"treetop",0.2325856151,1.7246039787,-0.1675338127,"https://salsa.debian.org/ruby-team/ruby-treetop","https://github.com/cjheath/treetop/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA -"truncato",-0.892450421,1.0747849229,-1.3078720915,"https://salsa.debian.org/ruby-team/ruby-truncato","https://github.com/jorgemanrubia/truncato",3523.9293634259,2,13,0,10,27,0,0,28,2,"2",1.86666666666667,1.96428571428571 -"twitter",-0.6682623901,1.3259076585,-1.147074381,"https://salsa.debian.org/ruby-team/ruby-twitter","https://github.com/sferik/twitter",5668.765474537,66,150,0,172,52,0,171,383,4,"4",1.69444444444444,1.13577023498695 -"twitter-stream",-0.4992291188,2.3271486963,-1.2824567535,"https://salsa.debian.org/ruby-team/ruby-twitter-stream","http://github.com/voloko/twitter-stream/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA -"typed-array",-0.7061785139,1.6402446003,-1.1445021258,"https://salsa.debian.org/ruby-team/ruby-typed-array","https://github.com/yaauie/typed-array",63.5884953704,0,2,0,2,2,0,0,2,1,"1",2,2 -"typhoeus",-0.1128851981,2.3506320669,-0.7362615291,"https://salsa.debian.org/ruby-team/ruby-typhoeus","https://github.com/typhoeus/typhoeus/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA -"issues",-0.1835463152,-0.1043691104,-0.2043071695,"https://salsa.debian.org/ruby-team/ruby-tzinfo","https://tzinfo.github.io/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA -"url_safe_base64",-1.0899769047,2.7888654476,-2.2202803102,"https://salsa.debian.org/ruby-team/ruby-url-safe-base64","https://github.com/joenoon/url_safe_base64",1866.2862384259,0,2,0,2,2,0,0,2,1,"1",2,2 -"uuid",-0.141865508,3.1821978286,-1.059582524,"https://salsa.debian.org/ruby-team/ruby-uuid","https://github.com/assaf/uuid",4250.514537037,5,18,0,13,78,0,1,81,3,"3",1.78260869565217,1.96296296296296 -"uuidtools",0.0082132863,1.7860368385,-0.3798291083,"https://salsa.debian.org/ruby-team/ruby-uuidtools","https://github.com/sporkmonger/uuidtools",4302.5516087963,4,20,0,12,66,0,3,70,3,"3",1.83333333333333,1.94285714285714 -"validates_email",-1.5781922437,0.7480299974,-2.1834264358,"https://salsa.debian.org/ruby-team/ruby-validate-email","https://github.com/perfectline/validates_email.git",4596.2118865741,2,8,0,4,9,0,0,9,3,"3",1.8,2 -"validates_hostname",-1.2415295122,1.2211165969,-1.7510919236,"https://salsa.debian.org/ruby-team/ruby-validates-hostname","https://github.com/KimNorgaard/validates_hostname",4293.8459722222,0,12,0,5,18,0,0,18,3,"3",2,2 -"varia_model",-1.8678804974,-0.0930481582,-2.2356906543,"https://salsa.debian.org/ruby-team/ruby-varia-model","https://github.com/berkshelf/varia_model/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA -"version_sorter",-0.8955692286,1.3134248845,-1.3333811894,"https://salsa.debian.org/ruby-team/ruby-version-sorter","https://github.com/github/version_sorter",5346.8123032407,4,15,0,12,21,0,0,23,4,"4",1.78947368421053,1.91304347826087 -"versionomy",-1.9875633378,1.0365445382,-2.7207117207,"https://salsa.debian.org/ruby-team/ruby-versionomy","https://github.com/dazuma/versionomy/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA -"Voight-Kampff",-3.6122138418,-1.1841868732,-4.2747449932,"https://salsa.debian.org/ruby-team/ruby-voight-kampff","https://github.com/biola/Voight-Kampff/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA -"web-console",0.1404315345,2.5211217633,-0.3233556237,"https://salsa.debian.org/ruby-team/ruby-web-console","https://github.com/rails/web-console/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA -"webmock",-0.8722996031,1.4227793478,-1.5805653267,"https://salsa.debian.org/ruby-team/ruby-webmock","https://github.com/bblimke/webmock/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA -"websocket-ruby",-2.0302234955,1.0763961168,-2.8933706474,"https://salsa.debian.org/ruby-team/ruby-websocket","https://github.com/imanel/websocket-ruby.git",4172.1994328704,3,14,0,15,38,0,0,39,3,"3",1.82352941176471,1.97435897435897 -"xml-simple",0.2810527115,2.941255221,-0.5650827802,"https://salsa.debian.org/ruby-team/ruby-xml-simple","https://github.com/maik/xml-simple",3655.0192476852,4,12,0,12,31,0,0,31,2,"2",1.75,2 -"scalpel",1.9235574134,5.7889102705,0.6091390984,"https://salsa.debian.org/pkg-security-team/scalpel","https://github.com/sleuthkit/scalpel.git",2828.8538888889,1,11,0,5,69,0,0,69,2,"2",1.91666666666667,2 -"scanlogd",1.0265172022,3.3179170915,-0.0529925024,"https://salsa.debian.org/debian/scanlogd/","https://github.com/openwall/scanlogd.git",3573.3593287037,0,2,0,1,4,0,0,4,2,"2",2,2 -"scapy",0.8574558824,1.870596003,0.3040325575,"https://salsa.debian.org/pkg-security-team/scapy","https://github.com/secdev/scapy/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA -"maeparser",-0.1240254936,2.1383222642,-0.7555796895,"https://salsa.debian.org/debichem-team/schroedinger-maeparser","https://github.com/schrodinger/maeparser.git",2087.1343287037,12,14,0,15,15,0,0,16,1,"1",1.53846153846154,1.9375 -"science.js",-1.5791662472,1.653426766,-2.4733135985,"https://salsa.debian.org/js-team/science.js/","https://github.com/jasondavies/science.js.git",2725.1817592593,1,8,0,6,30,0,0,30,1,"1",1.88888888888889,2 -"scim",1.8800598007,2.6066941269,1.3618783859,"https://github.com/leggewie-DM/scim","https://github.com/leggewie-DM/scim",3009.7372800926,4,5,0,6,2,0,0,7,2,"2",1.55555555555556,1.28571428571429 -"scim-anthy",0.002293794,1.4287101867,-0.6578723431,"https://github.com/leggewie-DM/scim-anthy","https://github.com/leggewie-DM/scim-anthy",1414.2472685185,5,3,0,5,1,0,0,6,1,"1",1.375,1.16666666666667 -"scim-chewing",1.4542811691,3.3715479543,0.5061771978,"https://salsa.debian.org/debian/scim-chewing","https://github.com/chewing/scim-chewing.git",2973.6130092593,0,11,0,4,6,0,0,6,2,"2",2,2 -"scim-pinyin",1.3124715757,3.3775777533,0.2280732409,"https://salsa.debian.org/input-method-team/scim-pinyin","https://github.com/scim-im/scim-pinyin/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA -"scim-tables",0.9359530215,2.2487851526,0.2559891027,"https://github.com/leggewie-DM/scim-tables","https://github.com/leggewie-DM/scim-tables",793.6947685185,3,3,0,3,1,0,0,4,1,"1",1.5,1.25 -"sct-deb",0.114819976,2.8309553504,-0.5908234474,"https://github.com/Tookmund/sct-deb","https://github.com/Tookmund/sct-deb",125.8640393519,0,1,0,1,0,0,0,1,1,"1",2,1 -"setuptools_scm",0.0218119153,1.0762900197,-0.3060730181,"https://salsa.debian.org/python-team/packages/setuptools-scm","https://github.com/pypa/setuptools_scm/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA -"setuptools_scm_git_archive",-1.1288748526,1.4309706158,-1.7245251246,"https://salsa.debian.org/python-team/packages/setuptools-scm-git-archive","https://github.com/Changaco/setuptools_scm_git_archive",2852.8371759259,5,5,0,7,22,0,0,22,2,"2",1.5,2 -"sexplib",-1.5719893405,-0.308694773,-1.9907588838,"https://salsa.debian.org/ocaml-team/sexplib310","https://github.com/janestreet/sexplib.git",3950.7644444445,1,18,0,12,43,0,0,48,3,"3",1.94736842105263,1.89583333333333 -"sgabios-debian",0.6248433625,3.3447922772,-0.1006393146,"https://github.com/ymc/sgabios-debian","https://github.com/ymc/sgabios-debian",1409.8465509259,1,3,0,3,2,0,0,3,1,"1",1.75,1.66666666666667 -"shine",0.5449317214,2.5585883378,0.0206552894,"https://salsa.debian.org/multimedia-team/shine","https://github.com/savonet/shine/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA -"showq",0.4980241305,2.6384494868,-0.2994881583,"https://salsa.debian.org/multimedia-team/showq","https://github.com/evandelisle/showq.git",4589.6974189815,2,9,0,4,11,0,1,12,3,"3",1.81818181818182,1.91666666666667 -"shutdown-qapps",0.083229246,2.5754574312,-0.646790907,"https://github.com/hakaishi/shutdown-qapps","https://github.com/hakaishi/shutdown-qapps",4242.5183217593,1,5,0,2,4,0,0,4,3,"3",1.83333333333333,2 -"sidedoor",-1.2070083599,0.905385237,-1.6442775708,"https://github.com/daradib/sidedoor","https://github.com/daradib/sidedoor",1283.144525463,0,2,0,2,5,0,0,6,1,"1",2,1.83333333333333 -"siege",0.97547978,2.0335300671,0.3603230005,"https://salsa.debian.org/debian/siege","https://github.com/JoeDog/siege/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA -"sight",-2.4142300337,-1.1923515267,-2.6246960575,"https://salsa.debian.org/med-team/sight","https://github.com/IRCAD/sight",5195.7820833333,18,189,0,40,13,0,0,45,4,"4",1.91304347826087,1.28888888888889 -"signify",-0.42914773,1.9932487279,-0.9002655171,"https://salsa.debian.org/debian/signify-openbsd","https://github.com/aperezdc/signify.git",3467.3640972222,11,5,0,8,28,0,0,30,2,"2",1.3125,1.93333333333333 -"sigscheme",0.0095840913,0.5411815775,-0.1766561408,"https://salsa.debian.org/debian/sigscheme","https://github.com/uim/sigscheme.git",4570.4844212963,0,12,0,4,6,0,0,8,3,"3",2,1.75 -"silver-platter",-2.1237439075,-0.8804783102,-2.3543625093,"https://salsa.debian.org/jelmer/silver-platter","https://github.com/jelmer/silver-platter/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA -"timeline",0.4007687558,3.0154567789,-0.4849247131,"https://salsa.debian.org/js-team/simile-timeline","https://github.com/simile-widgets/timeline/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA -"simple-image-reducer",0.1736790136,2.6063762202,-0.6423729726,"https://salsa.debian.org/python-team/packages/simple-image-reducer","https://github.com/henrythasler/simple-image-reducer",3392.7195833333,3,5,0,5,11,0,0,11,2,"2",1.625,2 -"sklearn-pandas",-0.1846814273,2.4060352331,-0.9752323305,"https://salsa.debian.org/debian/sklearn-pandas","https://github.com/scikit-learn-contrib/sklearn-pandas/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA -"SkyPat",-3.6622190091,-1.2552465603,-4.2901929758,"https://salsa.debian.org/debian/skypat","https://github.com/skymizer/SkyPat",1330.0854513889,4,12,0,7,15,0,1,18,1,"1",1.75,1.83333333333333 -"slick-greeter",0.230041088,2.4883516609,-0.403804259,"https://github.com/UbuntuBudgie/slick-greeter/tree/debian","https://github.com/UbuntuBudgie/slick-greeter",2438.3149768519,27,9,0,9,3,0,0,10,1,"1",1.25,1.3 -"smarty-gettext",-0.1172764021,0.9213265959,-0.4308872423,"https://salsa.debian.org/debian/smarty-gettext/","https://github.com/smarty-gettext/smarty-gettext.git",3367.1055439815,3,7,0,6,31,0,0,31,2,"2",1.7,2 -"smarty-lexer",-2.1771173058,0.8224220515,-2.9339605005,"https://salsa.debian.org/debian/smarty-lexer/","https://github.com/smarty-php/smarty-lexer.git",2967.1062731482,1,5,0,2,3,0,0,4,2,"2",1.83333333333333,1.75 -"smash",-1.6021448383,1.016931715,-2.2070553084,"https://salsa.debian.org/js-team/smash","https://github.com/mbostock/smash.git",1268.6711921296,0,6,0,5,23,0,4,27,1,"1",2,1.85185185185185 -"smbldap-tools",4.0992169923,6.2973766162,2.977896731,"https://salsa.debian.org/debian/smbldap-tools","https://github.com/fumiyas/smbldap-tools",3527.4513194445,0,4,0,1,2,0,0,3,2,"2",2,1.66666666666667 -"snake4.debian",0.095148698,1.3696917472,-0.4120560031,"https://github.com/alexdantas/snake4.debian","https://github.com/alexdantas/snake4.debian",10.4776388889,5,4,0,0,2,0,0,2,1,"1",1.44444444444444,2 -"sndfile-tools",0.7443837151,2.9271900432,0.0039892841,"https://salsa.debian.org/multimedia-team/sndfile-tools","https://github.com/libsndfile/sndfile-tools.git",5283.239212963,10,6,0,14,26,0,0,26,4,"4",1.375,2 -"debian-snetz",-0.1935171339,3.2904821975,-1.2264363982,"https://github.com/paniagua-gustavo/debian-snetz","https://github.com/paniagua-gustavo/debian-snetz",0.188125,0,2,0,1,0,0,0,1,1,"1",2,1 -"sord",0.6196290047,2.4503028479,0.0661140316,"https://salsa.debian.org/multimedia-team/sord","https://github.com/drobilla/sord.git",4651.0402893519,0,1,0,1,9,0,0,9,3,"3",2,2 -"python-sortedcollections",0.0282138035,2.5630571401,-0.4563520078,"https://salsa.debian.org/python-team/packages/sortedcollections","https://github.com/grantjenks/python-sortedcollections",2101.4924884259,2,4,0,4,19,0,0,19,1,"1",1.66666666666667,2 -"sosi2osm",-0.0665032677,2.7414888103,-0.7399578074,"https://salsa.debian.org/debian-gis-team/sosi2osm","https://github.com/Gnonthgol/sosi2osm.git",3689.8328125,3,10,0,6,9,0,0,11,2,"2",1.76923076923077,1.81818181818182 -"soundconverter",0.4540740816,1.0143004971,0.117664665,"https://salsa.debian.org/multimedia-team/soundconverter","https://github.com/kassoulet/soundconverter/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA -"spacefm",0.0215364285,0.7019135888,-0.2802976133,"https://github.com/mati75/spacefm.git","https://github.com/mati75/spacefm.git",3876.4630671296,0,4,0,2,1,0,0,2,3,"3",2,1.5 -"SparkleShare",0.9167518699,2.534959747,0.0535700536,"https://salsa.debian.org/debian/sparkleshare","https://github.com/hbons/SparkleShare",4856.867974537,90,134,3,141,8,0,73,221,3,"3",1.59821428571429,1.03619909502262 -"speechd-up",-1.2789607706,1.2929705527,-2.0775310838,"https://salsa.debian.org/a11y-team/speechd-up","https://github.com/williamh/speechd-up.git",1059.3273726852,1,4,0,2,3,0,0,5,1,"1",1.8,1.6 -"speedpad-debian",-0.3911902301,0.972185266,-0.6939336088,"https://github.com/ltworf/speedpad-debian","https://github.com/ltworf/speedpad-debian",829.1033101852,0,2,0,1,0,0,0,1,1,"1",2,1 -"sphinx-argparse",-0.7549373494,1.0088944933,-1.2169968655,"https://salsa.debian.org/python-team/packages/sphinx-argparse","https://github.com/ribozz/sphinx-argparse",2938.5171412037,2,31,0,22,35,0,0,46,2,"2",1.93939393939394,1.76086956521739 -"sphinx-astropy",-1.4271235012,-0.7867770371,-1.5421845699,"https://salsa.debian.org/debian-astro-team/sphinx-astropy","https://github.com/astropy/sphinx-astropy",4334.9151736111,3,25,1,17,25,0,1,31,3,"3",1.89285714285714,1.80645161290323 -"sphinx-autorun",-1.0917758526,1.7268550032,-1.8045400627,"https://salsa.debian.org/python-team/packages/sphinx-autorun","https://github.com/hobarrera/sphinx-autorun",4960.1845949074,3,8,0,6,17,0,0,20,3,"3",1.72727272727273,1.85 -"sphinx_celery",-1.2937827686,0.4938075079,-1.9951471611,"https://salsa.debian.org/python-team/packages/sphinx-celery","https://github.com/celery/sphinx_celery",2803.725,12,7,1,15,21,0,0,21,2,"2",1.36842105263158,2 -"sphinx-paramlinks",-1.1682253235,0.3868734443,-1.5684932781,"https://salsa.debian.org/python-team/packages/sphinx-paramlinks","https://github.com/sqlalchemyorg/sphinx-paramlinks",3511.5527777778,5,5,0,7,18,0,0,19,2,"2",1.5,1.94736842105263 -"autoprogram",-1.4560452615,-0.2596772946,-1.6612142206,"https://salsa.debian.org/python-team/packages/sphinxcontrib-autoprogram","https://github.com/sphinx-contrib/autoprogram.git",3291.9937962963,8,16,0,20,46,0,0,53,2,"2",1.66666666666667,1.86792452830189 -"sratom",0.5401649761,2.8512138953,0.0136305168,"https://salsa.debian.org/multimedia-team/sratom","https://github.com/lv2/sratom.git",4263.558912037,3,1,0,4,5,0,0,6,3,"3",1.25,1.83333333333333 -"python-sshpubkeys",-1.9121140748,-0.1894818509,-2.3312629201,"https://salsa.debian.org/python-team/packages/sshpubkeys","https://github.com/ojarva/python-sshpubkeys.git",3267.3521759259,3,17,0,14,29,0,0,36,2,"2",1.85,1.80555555555556 -"sslsniff",0.7229167902,2.7591250777,-0.184867548,"https://salsa.debian.org/pkg-security-team/sslsniff","https://github.com/moxie0/sslsniff.git",177.084849537,0,2,0,1,0,0,1,2,1,"1",2,1 -"st",-1.7905650767,0.6769505545,-2.3325670973,"https://salsa.debian.org/debian/st-console","https://github.com/nferraz/st",3551.6255439815,0,6,0,4,35,0,0,36,2,"2",2,1.97222222222222 -"starfighter",1.1315056363,2.4483606179,0.4071420536,"https://salsa.debian.org/fmneto-guest/starfighter","https://github.com/pr-starfighter/starfighter",4492.0575231482,7,18,0,11,15,0,0,17,3,"3",1.72,1.88235294117647 -"starjava",-0.5484854258,1.0238215507,-0.8398906165,"https://salsa.debian.org/debian-astro-team/starjava-topcat","https://github.com/Starlink/starjava/issues/new",2746.3319791667,2,17,0,0,0,0,0,29,2,"2",1.89473684210526,1 -"starjava",-0.6975561907,0.0612089874,-0.8309402362,"https://salsa.debian.org/debian-astro-team/starjava-ttools","https://github.com/Starlink/starjava/issues/new",2746.3319791667,2,17,0,0,0,0,0,29,2,"2",1.89473684210526,1 -"starjava",-0.5724217622,0.5167921554,-0.7890780686,"https://salsa.debian.org/debian-astro-team/starjava-util","https://github.com/Starlink/starjava",5785.0740046296,2,26,0,10,26,0,0,29,4,"4",1.92857142857143,1.89655172413793 -"Starman",-0.4167370479,0.4887372311,-0.5755472783,"https://salsa.debian.org/perl-team/modules/packages/starman","https://github.com/miyagawa/Starman/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA -"staticsite",-0.4550445168,2.6259534139,-1.4004015176,"https://salsa.debian.org/enrico/staticsite","https://github.com/spanezz/staticsite",2745.0971527778,0,7,1,5,10,0,0,11,1,"1",2,1.90909090909091 -"stex",-4.0668315454,-2.4954928101,-4.3496245401,"https://salsa.debian.org/debian/stex","https://github.com/dybvig/stex",1828.8861226852,1,7,0,3,5,0,0,6,1,"1",1.875,1.83333333333333 -"stlink",0.2330578642,3.0498837848,-0.4676802192,"https://github.com/bluca/stlink","https://github.com/bluca/stlink",4380.0284722222,78,192,0,121,3,0,0,124,3,"3",1.71111111111111,1.0241935483871 -"stress",0.7791794941,3.5368026661,-0.027963401,"https://salsa.debian.org/debian/stress","https://github.com/resurrecting-open-source-projects/stress",489.8052893519,0,3,0,2,7,0,0,7,1,"1",2,2 -"subdownloader",0.2576738138,1.416208065,-0.2677955961,"https://salsa.debian.org/python-team/packages/subdownloader","https://github.com/subdownloader/subdownloader",4731.6769560185,4,22,3,10,23,0,0,27,3,"3",1.84615384615385,1.85185185185185 -"subtitleeditor",0.4715189003,1.2173077891,0.045958129,"https://salsa.debian.org/debian/subtitleeditor","https://github.com/kitone/subtitleeditor",5679.7465856482,2,6,0,6,54,0,1,55,4,"4",1.75,1.98181818181818 -"pkg-subtle",-0.1057456347,2.6291844345,-1.1261393388,"http://github.com/formorer/pkg-subtle","http://github.com/formorer/pkg-subtle",305.3167708333,0,1,0,0,0,0,0,0,1,"1",2,NA -"subvertpy",-0.0856463379,0.9174986859,-0.5281506467,"https://salsa.debian.org/python-team/packages/subvertpy","https://github.com/jelmer/subvertpy",3827.0174421296,14,36,0,29,16,0,0,41,3,"3",1.72,1.39024390243902 -"suil",0.6666244731,2.9498824035,0.0198598554,"https://salsa.debian.org/multimedia-team/suil","https://github.com/lv2/suil.git",4625.665625,6,1,0,7,14,0,0,15,3,"3",1.14285714285714,1.93333333333333 -"sway",-0.0003144281,1.8211497146,-0.4602739815,"https://salsa.debian.org/swaywm-team/sway","https://github.com/swaywm/sway/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA -"lv2",0.0271485834,2.3196893623,-0.405826923,"https://salsa.debian.org/multimedia-team/swh-lv2","https://github.com/swh/lv2",4769.9272800926,1,14,0,7,17,0,1,19,3,"3",1.93333333333333,1.89473684210526 -"ladspa",0.7083949622,1.4520571608,0.2842081476,"https://salsa.debian.org/multimedia-team/swh-plugins","https://github.com/swh/ladspa.git",5572.5839930556,1,25,0,15,58,0,0,58,4,"4",1.96153846153846,2 -"swift-bench",-3.6971618893,-0.9738891515,-4.3114902928,"https://salsa.debian.org/openstack-team/services/swift-bench","https://github.com/openstack/swift-bench.git",4746.0268287037,8,47,0,37,2,0,0,39,3,"3",1.85454545454545,1.05128205128205 -"swupdate",-4.1380420208,-0.3765046535,-5.2410349606,"https://salsa.debian.org/debian/swupdate","https://github.com/sbabic/swupdate",3657.1083217593,179,6,0,128,0,0,1,129,2,"2",1.03243243243243,1 -"sxid",0.3383169662,2.494076504,-0.6427792124,"https://salsa.debian.org/debian/sxid","https://github.com/taem/sxid",1429.0293865741,0,1,0,1,2,0,0,3,1,"1",2,1.66666666666667 -"synthv1",0.0241434868,1.3740935149,-0.399365925,"https://salsa.debian.org/multimedia-team/synthv1","https://github.com/rncbc/synthv1.git",4117.1360763889,0,14,0,3,15,0,0,15,3,"3",2,2 -"syrep",-0.3840410127,1.5663799383,-1.1500496799,"https://github.com/JonathonReinhart/syrep","https://github.com/JonathonReinhart/syrep",0.0023611111,1,1,0,1,2,0,0,3,1,"1",1.5,1.66666666666667 -"sysfsutils",1.4604939319,2.5043938068,0.8202891312,"https://git.hadrons.org/cgit/debian/pkgs/sysfsutils.git","https://github.com/linux-ras/sysfsutils/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA -"syslog-ng-debian",0.3360880552,0.5117634173,0.1859714072,"https://github.com/gcsideal/syslog-ng-debian","https://github.com/gcsideal/syslog-ng-debian",4178.4473842593,0,12,0,6,7,0,0,8,3,"3",2,1.875 -"ocaml-syslog",-0.9966573409,1.2541731317,-1.7322570063,"https://salsa.debian.org/ocaml-team/syslog-ocaml","https://github.com/geneanet/ocaml-syslog.git",690.8139351852,1,3,0,2,3,0,0,3,1,"1",1.75,2 -"system-config-printer",2.3553472865,3.3297611296,1.7170434503,"https://salsa.debian.org/gnome-team/system-config-printer","https://github.com/OpenPrinting/system-config-printer/commits/master",5185.326875,55,11,0,0,0,0,0,0,4,"4",1.16666666666667,NA -"systemd-bootchart",0.0589352376,2.4948219717,-0.5217369948,"https://salsa.debian.org/systemd-team/systemd-bootchart","https://github.com/systemd/systemd-bootchart",2813.8079282408,13,11,0,15,41,0,0,41,2,"2",1.45833333333333,2 -"systemd-cron",0.2435713073,1.0673184216,-0.1917909328,"https://salsa.debian.org/systemd-team/systemd-cron","https://github.com/systemd-cron/systemd-cron.git",3852.6322916667,2,17,0,15,36,0,0,42,3,"3",1.89473684210526,1.85714285714286 -"systemfixtures",-2.6293231508,-0.9364247044,-3.0058243691,"https://salsa.debian.org/python-team/modules/systemfixtures","https://github.com/testing-cabal/systemfixtures.git",2181.1332638889,4,4,0,5,9,0,0,9,1,"1",1.5,2 -"systray-mdstat",-0.4934338937,2.3728697502,-1.2391690443,"https://github.com/xtaran/systray-mdstat","https://github.com/xtaran/systray-mdstat",1731.2023611111,1,1,0,2,1,0,0,2,1,"1",1.5,1.5 -"systune",-0.2655422679,0.9388013102,-0.7018488457,"https://github.com/sudipm-mukherjee/systune.git","https://github.com/sudipm-mukherjee/systune.git",176.0601736111,1,4,0,2,3,0,0,3,1,"1",1.8,2 -"sysvinit",1.5203549982,1.687243769,1.3661977311,"https://salsa.debian.org/debian/sysvinit","https://github.com/slicer69/sysvinit",5198.3006944445,2,8,0,4,17,0,0,19,4,"4",1.8,1.89473684210526 -"PEGTL",-2.2004802085,0.2251806172,-2.7633878882,"https://salsa.debian.org/birger/tao-pegtl","https://github.com/taocpp/PEGTL/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA -"tap-plugins",0.09238064,1.3104592411,-0.1802167379,"https://salsa.debian.org/multimedia-team/tap-plugins","https://github.com/tomszilagyi/tap-plugins.git",5078.9168287037,3,8,0,0,2,0,0,2,4,"4",1.72727272727273,2 -"tclsignal",0.119740533,2.2371868408,-0.3075114676,"https://salsa.debian.org/tcltk-team/tcl-signal","https://github.com/wjoye/tclsignal",2449.858275463,1,4,0,3,4,0,0,4,1,"1",1.8,2 -"terminaltables",0.4124929606,3.3980129071,-0.3182990743,"https://git.progress-linux.org/users/daniel.baumann/debian/packages/terminaltables","https://github.com/matthewdeanmartin/terminaltables",2707.668125,1,11,0,9,4,0,0,12,1,"1",1.91666666666667,1.33333333333333 -"termrec",-0.546232522,1.7238998812,-0.9959233042,"https://github.com/kilobyte/termrec/tree/debian","https://github.com/kilobyte/termrec",5312.9533564815,0,2,0,1,8,0,0,8,4,"4",2,2 -"tesseract-lang-debian",0.323928139,1.2279995331,-0.0238272916,"https://github.com/AlexanderP/tesseract-lang-debian","https://github.com/AlexanderP/tesseract-lang-debian",1566.6614814815,0,5,0,3,2,0,0,3,1,"1",2,1.66666666666667 -"test-kitchen",-0.9210414384,1.3276246051,-1.6015563224,"https://salsa.debian.org/ruby-team/test-kitchen","https://github.com/test-kitchen/test-kitchen/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA -"testpath",0.178377175,1.4251577183,-0.1467982799,"https://salsa.debian.org/python-team/packages/testpath","https://github.com/jupyter/testpath.git",2578.9209490741,1,9,0,7,23,0,0,23,1,"1",1.9,2 -"brev-cls",-0.9042148426,0.8986607838,-1.4914577347,"https://salsa.debian.org/debian/tetex-brev","https://github.com/asgeirn/brev-cls.git",3127.5767708333,2,4,0,3,3,0,0,3,2,"2",1.66666666666667,2 -"tex-common",0.1512318896,0.2576765609,0.0745875585,"https://github.com/debian-tex/tex-common","https://github.com/debian-tex/tex-common",5410.6258333333,2,8,0,3,1,0,0,3,4,"4",1.8,1.33333333333333 -"tex-gyre",1.3108709384,3.2134416841,0.4567270817,"https://github.com/debian-tex/tex-gyre","https://github.com/debian-tex/tex-gyre",5218.6495833333,2,7,0,3,2,0,0,3,4,"4",1.77777777777778,1.66666666666667 -"texext",-0.4966012771,2.4692944946,-1.3814646844,"https://salsa.debian.org/python-team/packages/texext","https://github.com/matthew-brett/texext.git",2951.8081134259,0,5,0,4,11,0,0,11,2,"2",2,2 -"texinfo",1.2380835186,1.5944121073,0.9657638025,"https://github.com/debian-tex/texinfo","https://github.com/debian-tex/texinfo",5779.8813425926,3,9,0,5,6,0,0,6,4,"4",1.75,2 -"texlive-nonbin",1.1567962942,1.3629616108,0.9821522688,"https://github.com/debian-tex/texlive-nonbin/tree/master/texlive-base","https://github.com/debian-tex/texlive-nonbin",4319.3633101852,4,9,0,6,2,0,0,6,3,"3",1.69230769230769,1.33333333333333 -"texlive-bin",0.977654239,1.2601203851,0.7506196709,"https://github.com/debian-tex/texlive-bin","https://github.com/debian-tex/texlive-bin",4308.437662037,3,11,0,5,3,0,0,5,3,"3",1.78571428571429,1.6 -"texlive-nonbin",0.8703298986,1.0658084365,0.7081177712,"https://github.com/debian-tex/texlive-nonbin/tree/master/texlive-extra","https://github.com/debian-tex/texlive-nonbin",4319.3633101852,4,9,0,6,2,0,0,6,3,"3",1.69230769230769,1.33333333333333 -"texlive-nonbin",0.7296144256,1.0788261732,0.4593754059,"https://github.com/debian-tex/texlive-nonbin/tree/master/texlive-lang","https://github.com/debian-tex/texlive-nonbin",4319.3633101852,4,9,0,6,2,0,0,6,3,"3",1.69230769230769,1.33333333333333 -"texworks",0.3457955776,1.3076412249,-0.0653044306,"https://github.com/debian-tex/texworks","https://github.com/debian-tex/texworks",4991.6789583333,1,9,0,5,2,0,0,5,4,"4",1.9,1.4 -"texworks-manual",0.1987398847,2.5940035152,-0.3212280071,"https://github.com/debian-tex/texworks-manual","https://github.com/debian-tex/texworks-manual",1933.1899652778,2,5,0,3,1,0,0,3,1,"1",1.71428571428571,1.33333333333333 -"thaixfonts",0.1281624612,0.8719218593,-0.2256916476,"https://salsa.debian.org/debian/thaixfonts","https://github.com/tlwg/thaixfonts/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA -"three.js",0.1158900848,1.6807050834,-0.3114096336,"https://salsa.debian.org/js-team/three.js","https://github.com/mrdoob/three.js/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA -"thunar-dropbox",0.1154555368,2.1832206667,-0.4180527247,"https://salsa.debian.org/xfce-extras-team/thunar-dropbox-plugin","https://github.com/jeinzi/thunar-dropbox.git",3052.1741319445,2,6,0,4,6,0,0,9,2,"2",1.75,1.66666666666667 -"timbl",-0.4012992985,1.3917222421,-0.9206654469,"https://salsa.debian.org/science-team/timbl","https://github.com/LanguageMachines/timbl.git",2913.2087384259,0,8,0,2,8,0,0,8,2,"2",2,2 -"tinyssh",-1.473292065,0.8649169728,-1.916526544,"https://salsa.debian.org/debian/tinyssh","https://github.com/janmojzis/tinyssh.git",3264.9232175926,1,18,0,10,66,0,0,67,2,"2",1.94736842105263,1.98507462686567 -"tp_smapi",0.8443233686,2.0576796454,0.2538706265,"https://salsa.debian.org/debian/tp-smapi","https://github.com/linux-thinkpad/tp_smapi",4476.6966550926,6,7,0,5,90,0,2,92,3,"3",1.53846153846154,1.97826086956522 -"tpm2-initramfs-tool",-1.4035912508,1.8041112115,-2.1934256167,"https://github.com/timchen119/tpm2-initramfs-tool","https://github.com/timchen119/tpm2-initramfs-tool",486.0112962963,0,2,0,0,6,0,0,6,1,"1",2,2 -"trace-cmd",0.0998974637,1.3978799562,-0.3546480844,"https://github.com/sudipm-mukherjee/trace-cmd.git","https://github.com/sudipm-mukherjee/trace-cmd.git",1314.92875,139,17,0,90,1,0,0,90,1,"1",1.10897435897436,1.01111111111111 -"trackballs",0.2450481241,1.0347559155,-0.1842061844,"https://salsa.debian.org/games-team/trackballs","https://github.com/trackballs/trackballs.git",2063.1770717593,6,7,0,7,20,0,0,20,1,"1",1.53846153846154,2 -"tran",-0.5507488829,1.9378847892,-1.0913812007,"https://github.com/kilobyte/tran/tree/debian","https://github.com/kilobyte/tran",4999.4501736111,0,1,0,1,3,0,0,3,4,"4",2,2 -"trayer-srg",0.7960935453,2.2360852153,0.1224095274,"https://salsa.debian.org/skangas/trayer","https://github.com/sargon/trayer-srg/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA -"triangle",-0.1711886516,3.1308185907,-1.215472085,"https://salsa.debian.org/science-team/triangle","https://github.com/libigl/triangle.git",2528.1501736111,2,7,0,5,8,0,0,8,1,"1",1.77777777777778,2 -"triggerhappy",1.5982884158,4.4832077788,0.3890624079,"https://github.com/wertarbyte/triggerhappy","https://github.com/wertarbyte/triggerhappy",2171.0642708333,5,5,0,7,41,0,0,44,1,"1",1.5,1.93181818181818 -"Trimage",1.2553852758,3.9585208411,0.1886888721,"https://salsa.debian.org/debian-phototools-team/trimage","https://github.com/Kilian/Trimage",4077.9117708333,2,17,0,9,64,0,0,66,3,"3",1.89473684210526,1.96969696969697 -"trinityrnaseq",-0.3652446175,1.4159966432,-0.9745313296,"https://salsa.debian.org/med-team/trinityrnaseq","https://github.com/trinityrnaseq/trinityrnaseq/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA -"trivial-features",0.2637949915,3.2767480587,-0.566814757,"https://salsa.debian.org/common-lisp-team/trivial-features","https://github.com/trivial-features/trivial-features",5548.6738657407,11,9,0,15,24,0,0,24,4,"4",1.45,2 -"trivial-gray-streams",-0.0499196075,1.9477808571,-0.5052595662,"https://salsa.debian.org/common-lisp-team/trivial-gray-streams","https://github.com/trivial-gray-streams/trivial-gray-streams/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA -"trocla",-1.1282943752,1.854915092,-2.1296966635,"https://salsa.debian.org/ruby-team/trocla","https://github.com/duritong/trocla",4222.9344444445,2,25,0,16,33,0,0,34,3,"3",1.92592592592593,1.97058823529412 -"trollsift",-2.0282713827,0.319975344,-2.4783042686,"https://salsa.debian.org/debian-gis-team/trollsift","https://github.com/pytroll/trollsift",3470.9592824074,4,15,0,12,21,0,0,22,2,"2",1.78947368421053,1.95454545454545 -"tslib-debian",0.1336789289,0.9994750001,-0.093473923,"https://github.com/merge/tslib-debian","https://github.com/merge/tslib-debian",1295.9506018519,2,3,0,1,1,0,0,1,1,"1",1.6,2 -"tty-clock",-0.284505417,0.4575702587,-0.4967187932,"https://github.com/anarcat/tty-clock/tree/debian","https://github.com/anarcat/tty-clock",3142.1821759259,0,24,0,13,1,0,0,14,2,"2",2,1.07142857142857 -"tweepy",0.3014929332,2.3332026362,-0.5274701476,"https://salsa.debian.org/python-team/packages/tweepy","https://github.com/tweepy/tweepy.git",5164.9313194445,72,189,0,197,21,0,0,215,4,"4",1.72413793103448,1.09767441860465 -"Twiggy",0.3100508018,4.0880000737,-0.8527826044,"https://salsa.debian.org/perl-team/modules/packages/twiggy","https://github.com/miyagawa/Twiggy/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA -"twms",-0.5922081551,1.2383570594,-1.1972199961,"https://salsa.debian.org/debian/twms","https://github.com/Komzpa/twms.git",2177.2821875,3,11,0,4,5,0,0,5,1,"1",1.78571428571429,2 -"uhub-debian",-0.2796838226,3.5742395891,-1.580799445,"https://github.com/tehnick/uhub-debian","https://github.com/tehnick/uhub-debian",4037.2023148148,0,1,0,1,1,0,0,2,3,"3",2,1.5 -"uim-chewing",-2.5213043929,-0.416096965,-2.9868668,"https://salsa.debian.org/debian/uim-chewing","https://github.com/uim/uim-chewing",1095.7200231482,0,1,0,0,0,0,0,0,1,"1",2,NA -"ukui-biometric-auth",-1.2310843043,0.7537049181,-1.6740612047,"https://github.com/ukui/ukui-biometric-auth","https://github.com/ukui/ukui-biometric-auth",1260.5815625,5,11,0,8,6,0,0,10,1,"1",1.6875,1.6 -"ukui-control-center",-2.2036628317,0.0511944606,-2.8931977038,"https://github.com/ukui/ukui-control-center","https://github.com/ukui/ukui-control-center",1921.8410069445,76,81,0,41,13,0,0,52,1,"1",1.51592356687898,1.25 -"ukui-indicators",-1.377804594,1.2157849638,-2.1158896015,"https://github.com/ukui/ukui-indicators","https://github.com/ukui/ukui-indicators",1239.8214814815,3,9,0,5,4,0,0,5,1,"1",1.75,1.8 -"ukui-power-manager",-0.3190978856,2.9128539736,-1.1219811752,"https://github.com/ukui/ukui-power-manager","https://github.com/ukui/ukui-power-manager",1544.224537037,3,19,0,9,9,0,0,14,1,"1",1.86363636363636,1.64285714285714 -"ukui-settings-daemon",0.1219875774,3.2976507371,-0.6818364877,"https://github.com/ukui/ukui-settings-daemon","https://github.com/ukui/ukui-settings-daemon",1595.2230439815,10,31,0,10,21,0,0,26,1,"1",1.75609756097561,1.80769230769231 -"ukui-themes",-0.5826962952,2.2384569095,-1.2986461297,"https://github.com/ukui/ukui-themes","https://github.com/ukui/ukui-themes",1509.1822916667,6,9,0,8,12,0,0,13,1,"1",1.6,1.92307692307692 -"umoci",-1.5049797774,0.5808986769,-2.0306653344,"https://salsa.debian.org/go-team/packages/umoci","https://github.com/opencontainers/umoci/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA -"unburden-home-dir",-0.501169023,0.195057165,-0.7613384703,"https://github.com/xtaran/unburden-home-dir","https://github.com/xtaran/unburden-home-dir",4201.5461342593,1,10,2,6,17,0,0,17,3,"3",1.90909090909091,2 -"underscore",0.5577202877,2.1670034109,0.0619794849,"https://salsa.debian.org/js-team/underscore","https://github.com/jashkenas/underscore.git",5084.8093171296,25,336,0,261,27,0,52,334,4,"4",1.93074792243767,1.08083832335329 -"Unhide",1.7061388819,3.8742874975,0.7376306506,"https://salsa.debian.org/pkg-security-team/unhide","https://github.com/YJesus/Unhide.git",991.7221296296,2,5,0,5,6,0,0,8,1,"1",1.71428571428571,1.75 -"unorm",-1.3130104406,0.8981282809,-1.8444156842,"https://salsa.debian.org/js-team/unorm.js","https://github.com/walling/unorm/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA -"unrar-nonfree",1.8473265605,3.1989063054,1.0595588445,"https://github.com/debian-calibre/unrar-nonfree","https://github.com/debian-calibre/unrar-nonfree",1876.6905902778,7,5,0,5,3,0,0,5,1,"1",1.41666666666667,1.6 -"unrardll",-0.7960021888,0.5888362105,-1.105938125,"https://github.com/debian-calibre/unrardll","https://github.com/debian-calibre/unrardll",1864.0022916667,0,4,0,3,1,0,0,3,1,"1",2,1.33333333333333 -"vagalume",-1.4511274237,-0.9732880608,-1.5424132302,"https://salsa.debian.org/berto/vagalume","https://github.com/bertogg/vagalume",2090.3450578704,26,3,0,19,0,0,0,19,1,"1",1.10344827586207,1 -"vagrant",0.2299619618,0.6284669987,0.0013114431,"https://salsa.debian.org/ruby-team/vagrant","https://github.com/hashicorp/vagrant/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA -"valabind",-1.2435397352,-0.3428907439,-1.6087950787,"https://salsa.debian.org/debian/valabind","https://github.com/radare/valabind",4839.9819560185,6,19,0,15,41,0,0,42,3,"3",1.76,1.97619047619048 -"valinor",-2.9368505692,-1.1020102649,-3.3193721608,"https://salsa.debian.org/python-team/packages/valinor","https://github.com/ARMmbed/valinor.git",1839.1786805556,3,12,0,9,17,0,0,17,1,"1",1.8,2 -"variantslib",-2.0986968646,0.447590858,-2.6103147834,"https://salsa.debian.org/ocaml-team/variantslib","https://github.com/janestreet/variantslib.git",3865.5561921296,0,7,0,5,3,0,0,8,3,"3",2,1.375 -"vcversioner",0.242716431,2.8314661474,-0.3332608567,"https://salsa.debian.org/python-team/packages/vcversioner","https://github.com/habnabit/vcversioner",1010.4509143519,0,4,0,2,18,0,0,18,1,"1",2,2 -"vfu-deb",0.7502192139,2.4194817119,-0.0549697238,"https://github.com/bbonev/vfu-deb","https://github.com/bbonev/vfu-deb",1063.877025463,0,1,0,1,0,0,0,1,1,"1",2,1 -"vim-autopep8",0.2098655728,3.1531229671,-0.5592658877,"https://salsa.debian.org/python-team/packages/vim-autopep8","https://github.com/tell-k/vim-autopep8.git",1821.7416782407,1,10,0,7,52,0,0,52,1,"1",1.90909090909091,2 -"command-t",-0.281217187,1.711936341,-0.8034960415,"https://github.com/yrro/command-t","https://github.com/yrro/command-t",4589.5430092593,66,14,0,60,1,0,0,61,3,"3",1.175,1.01639344262295 -"volumeicon-debian",0.5582239179,2.4117054016,-0.1176545428,"https://github.com/mati75/volumeicon-debian.git","https://github.com/mati75/volumeicon-debian.git",4377.0106597222,0,5,0,3,1,0,0,3,3,"3",2,1.33333333333333 -"csg",-1.3015984703,-0.1291946736,-1.7236921975,"https://salsa.debian.org/debichem-team/votca-csg","https://github.com/votca/csg/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA -"vowpal_wabbit",1.6051587851,4.7879705553,0.3258945817,"http://github.com/yarikoptic/vowpal_wabbit","http://github.com/yarikoptic/vowpal_wabbit",3692.4062037037,66,280,0,0,0,0,0,0,2,"2",1.80924855491329,NA -"vows",-1.3939497745,0.3324247114,-1.7950844541,"https://salsa.debian.org/js-team/vows","https://github.com/cloudhead/vows/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA -"vpcs",0.5719602774,3.99052142,-0.2987031963,"https://github.com/dlintott/vpcs","https://github.com/dlintott/vpcs",302.5271875,0,2,0,2,1,0,0,2,1,"1",2,1.5 -"vpnc",0.7552132496,1.2426452707,0.4176316467,"https://salsa.debian.org/debian/vpnc","https://github.com/streambinder/vpnc",5629.8413888889,11,17,0,19,26,0,0,30,4,"4",1.60714285714286,1.86666666666667 -"vue-router",-2.7239892069,-0.137337361,-3.3068761493,"https://salsa.debian.org/js-team/vue-router.js","https://github.com/vuejs/vue-router/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA -"vue",-1.0931356092,1.0186682685,-1.5343339016,"https://salsa.debian.org/js-team/vue.js","https://github.com/vuejs/vue/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA -"link-checker",1.0779084142,3.0562972028,0.1151150994,"https://salsa.debian.org/perl-team/modules/packages/w3c-linkchecker","https://github.com/w3c/link-checker/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA -"emacs-w3m",-0.0316215167,0.794577588,-0.429835318,"https://salsa.debian.org/debian/w3m-el-snapshot","https://github.com/emacs-w3m/emacs-w3m",5732.8756134259,8,17,0,19,38,0,2,46,4,"4",1.68,1.82608695652174 -"wadc",-1.3114197782,1.1488153676,-1.8942921561,"https://github.com/jmtd/wadc","https://github.com/jmtd/wadc",2669.3253125,2,7,0,3,5,0,0,5,1,"1",1.77777777777778,2 -"wajig",-0.2563640933,-0.2041280932,-0.289877151,"https://github.com/gjwgit/wajig/wajig","https://github.com/gjwgit/wajig",4746.4752546296,1,8,0,5,1,0,0,5,3,"3",1.88888888888889,1.2 -"wakeonlan",0.5347762299,2.3981769483,-0.0392961396,"https://salsa.debian.org/debian/wakeonlan","https://github.com/jpoliv/wakeonlan/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA -"wavbreaker",-0.3043692646,1.3080197333,-0.6434518402,"https://salsa.debian.org/multimedia-team/wavbreaker","https://github.com/thp/wavbreaker.git",5680.2477546296,3,6,0,9,15,12,0,28,4,"4",1.66666666666667,1.53571428571429 -"wbar",0.7206963622,2.6363178504,-0.1640676109,"https://salsa.debian.org/debian/wbar","https://github.com/rodolf0/wbar",1881.7045949074,0,2,0,1,2,0,0,3,1,"1",2,1.66666666666667 -"wcc",-2.4281741601,-0.9182887345,-2.9205469788,"https://salsa.debian.org/pkg-security-team/wcc","https://github.com/endrazine/wcc.git",2370.6538888889,7,12,0,16,41,0,4,45,1,"1",1.63157894736842,1.91111111111111 -"whysynth",1.6273877466,4.7945023636,0.3840495858,"https://salsa.debian.org/multimedia-team/whysynth","https://github.com/smbolton/whysynth.git",2132.1219444445,2,3,0,3,12,0,0,12,1,"1",1.6,2 -"wifite2",0.0691397747,1.3596647886,-0.2821965899,"https://salsa.debian.org/pkg-security-team/wifite","https://github.com/kimocoder/wifite2.git",3100.7875578704,19,31,0,35,28,0,0,57,2,"2",1.62,1.49122807017544 -"wiki2beamer",0.1072484039,2.9680033901,-0.7874436627,"https://salsa.debian.org/debian/wiki2beamer","https://github.com/wiki2beamer/wiki2beamer/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA -"wildmidi",1.1220449003,2.8689328624,0.3931106893,"https://salsa.debian.org/games-team/WildMIDI","https://github.com/psi29a/wildmidi.git",5284.7473726852,7,25,0,19,8,0,2,25,4,"4",1.78125,1.32 -"Willow",-0.3050026421,2.6837460292,-1.2006814281,"https://salsa.debian.org/python-team/packages/willow","https://github.com/torchbox/Willow/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA -"win-iconv",-0.1253180043,3.3611034506,-1.2784857777,"https://salsa.debian.org/debian/win-iconv","https://github.com/win-iconv/win-iconv",2428.4399189815,1,14,0,10,21,0,0,25,1,"1",1.93333333333333,1.84 -"winregfs",0.1505432946,2.5663630742,-0.3792554253,"https://salsa.debian.org/pkg-security-team/winregfs","https://github.com/jbruchon/winregfs",3358.8025694445,0,4,0,1,4,0,0,4,2,"2",2,2 -"wipe",0.0654274281,0.5099289571,-0.121010634,"https://salsa.debian.org/pkg-security-team/wipe","https://github.com/berke/wipe",5088.8252430556,3,5,0,3,11,0,0,12,4,"4",1.625,1.91666666666667 -"wiimms-iso-tools",-0.0137410528,2.2594017696,-0.6295812818,"https://salsa.debian.org/debian/wit","https://github.com/Wiimm/wiimms-iso-tools",764.4320717593,0,4,0,1,29,0,0,29,1,"1",2,2 -"with-simulated-input",-1.6136419534,0.6542791635,-2.0643984034,"https://salsa.debian.org/emacsen-team/with-simulated-input-el","https://github.com/DarwinAwardWinner/with-simulated-input.git",1593.3461921296,0,2,0,2,10,0,0,10,1,"1",2,2 -"wmaker",3.0318169815,3.5049705647,2.6333575748,"https://salsa.debian.org/wmaker-team/wmaker","https://github.com/window-maker/wmaker/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA -"wmbubble",0.3313340448,2.0551511806,-0.5004056988,"https://salsa.debian.org/wmaker-team/wmbubble","https://github.com/rnjacobs/wmbubble.git",3203.1598148148,0,5,0,2,5,0,0,5,2,"2",2,2 -"wmcoincoin",-1.1120470309,0.9428298773,-1.8126592182,"https://salsa.debian.org/wmaker-team/wmcoincoin","https://github.com/seeschloss/wmcoincoin/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA -"wmfrog",-0.6195008592,0.7362802602,-1.1251650057,"https://salsa.debian.org/wmaker-team/wmfrog","https://github.com/tcolar/wmfrog",4191.3952777778,0,7,0,2,2,0,0,2,3,"3",2,2 -"dockapps",0.2210226862,1.7529658495,-0.3718627509,"https://salsa.debian.org/wmaker-team/wmhdplop","https://github.com/window-maker/dockapps/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA -"wmpinboard",0.329930821,2.2481564254,-0.5833982398,"https://salsa.debian.org/wmaker-team/wmpinboard","https://github.com/bbidulock/wmpinboard.git",274.6021412037,0,3,0,2,2,0,0,3,1,"1",2,1.66666666666667 -"wmsysmon",3.6819786619,6.9497194781,2.2222684502,"https://salsa.debian.org/wmaker-team/wmsysmon","https://github.com/voyageur/wmsysmon.git",1940.3190625,0,3,0,2,3,0,0,3,1,"1",2,2 -"wokkel",-0.7494414246,1.5960211892,-1.3587677327,"https://salsa.debian.org/python-team/packages/wokkel","https://github.com/ralphm/wokkel.git",4842.8803125,0,5,0,5,26,0,0,27,3,"3",2,1.96296296296296 -"wondershaper",2.1493592104,4.1791752632,1.0723154812,"https://github.com/leggewie-DM/wondershaper","https://github.com/leggewie-DM/wondershaper",3187.6698263889,2,1,0,2,2,0,0,4,2,"2",1.33333333333333,1.5 -"wreport",-0.1794776423,1.6143054556,-0.8172719944,"https://github.com/ARPA-SIMC/wreport","https://github.com/ARPA-SIMC/wreport",4700.94625,2,14,0,5,11,0,0,11,3,"3",1.875,2 -"wslay",-0.3233505839,2.0096579304,-1.031639712,"https://salsa.debian.org/debian/wslay","https://github.com/tatsuhiro-t/wslay",2229.7935185185,3,18,1,17,70,0,0,71,1,"1",1.85714285714286,1.98591549295775 -"wtf-peewee",-1.1933920451,1.3018762525,-1.741694338,"https://salsa.debian.org/python-team/packages/wtf-peewee","https://github.com/coleifer/wtf-peewee",4437.0799652778,3,18,0,15,46,0,0,46,3,"3",1.85714285714286,2 -"wxAstroCapture",0.3727354069,3.1734912044,-0.4080125191,"https://salsa.debian.org/science-team/wxastrocapture","https://github.com/wxAstro/wxAstroCapture",45.0595833333,0,3,0,2,2,0,0,3,1,"1",2,1.66666666666667 -"wxGlade",-0.2335267372,0.1233893747,-0.4233597056,"https://salsa.debian.org/georgesk/wxglade","https://github.com/wxGlade/wxGlade/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA -"x11-touchscreen-calibrator",-0.1154983302,2.6722200137,-0.7875374212,"https://github.com/fourdollars/x11-touchscreen-calibrator","https://github.com/fourdollars/x11-touchscreen-calibrator",2225.1995717593,0,4,0,2,5,0,0,6,1,"1",2,1.83333333333333 -"x42-plugins",-0.1526190502,0.5990375172,-0.384890654,"https://salsa.debian.org/multimedia-team/x42-plugins","https://github.com/x42/x42-plugins",3642.2395023148,0,1,0,1,0,0,0,1,2,"2",2,1 -"xandikos",-1.700889354,-1.3947312282,-1.7687283402,"https://salsa.debian.org/jelmer/xandikos","https://github.com/jelmer/xandikos/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA -"xbomb.debian",2.5167931875,5.6510697336,1.1667397783,"https://github.com/alexdantas/xbomb.debian","https://github.com/alexdantas/xbomb.debian",472.1825347222,1,2,0,0,3,0,0,3,1,"1",1.66666666666667,2 -"xindy",0.1823763954,0.8822842515,-0.1274514217,"https://github.com/debian-tex/xindy","https://github.com/debian-tex/xindy",2719.8550694445,2,6,0,4,1,0,0,4,1,"1",1.75,1.25 -"xlsx2csv",0.199802941,2.3048255107,-0.3946294711,"https://salsa.debian.org/science-team/xlsx2csv","https://github.com/dilshod/xlsx2csv/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA -"xml-light",-0.3592724135,1.1896469114,-0.7772314943,"https://salsa.debian.org/ocaml-team/xml-light","https://github.com/ncannasse/xml-light.git",3963.0315046296,3,8,0,8,13,0,0,15,3,"3",1.72727272727273,1.86666666666667 -"xmountains",-0.6473598122,-0.4080618043,-0.6985149403,"https://salsa.debian.org/debian/xmountains","https://github.com/spbooth/xmountains/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA -"xnec2c",-0.2433745776,0.7919844064,-0.4889064627,"https://salsa.debian.org/debian-hamradio-team/xnec2c","https://github.com/KJ7LNW/xnec2c.git",5761.7881944445,5,7,0,8,22,0,0,22,4,"4",1.58333333333333,2 -"xplc",0.065119078,1.5804093595,-0.5441876363,"https://salsa.debian.org/debian/xplc","https://github.com/xplc/xplc/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA -"pkg-xppaut",0.480332333,2.5873961644,-0.4615269769,"https://github.com/neurodebian/pkg-xppaut","https://github.com/neurodebian/pkg-xppaut",171.362349537,6,2,0,3,0,0,0,3,1,"1",1.25,1 -"xprintidle",-0.1422188392,0.6249787453,-0.3518989739,"https://salsa.debian.org/debian/xprintidle","https://github.com/g0hl1n/xprintidle",3448.9179861111,2,6,2,2,15,0,0,15,2,"2",1.75,2 -"xsecurelock",-0.4681598236,2.8900823642,-1.3517451123,"https://github.com/google/xsecurelock/tree/debian","https://github.com/google/xsecurelock",3375.8872453704,17,12,2,18,50,0,0,63,2,"2",1.41379310344828,1.79365079365079 -"xtermcontrol",-0.0117403008,1.5858545623,-0.4569548478,"https://salsa.debian.org/debian/xtermcontrol","https://github.com/JessThrysoee/xtermcontrol.git",3429.399525463,0,2,0,1,17,0,0,17,2,"2",2,2 -"xtl",-4.7040789559,-1.5856206073,-5.4305613286,"https://github.com/quantstack-debian/xtl","https://github.com/quantstack-debian/xtl",1473.7952662037,0,3,0,2,1,0,0,3,1,"1",2,1.33333333333333 -"xttitle",0.8939077507,4.2706568139,-0.3819440692,"https://salsa.debian.org/debian/xttitle","https://github.com/mojotx/xttitle",2181.5912731482,2,3,0,2,2,0,0,2,1,"1",1.6,2 -"xwax",-0.5636629334,0.7271414205,-0.9498118303,"https://salsa.debian.org/multimedia-team/xwax","https://github.com/xwax/xwax.git",5550.8656712963,5,3,0,3,9,0,0,11,4,"4",1.375,1.81818181818182 -"xxdiff",0.9061004175,1.6510647261,0.4413690153,"https://salsa.debian.org/debian/xxdiff","https://github.com/blais/xxdiff.git",5451.0281134259,4,11,0,8,19,0,0,21,4,"4",1.73333333333333,1.9047619047619 -"xylib",0.6962815791,3.868426766,-0.2796991398,"https://salsa.debian.org/science-team/xylib","https://github.com/wojdyr/xylib",5291.0453703704,4,4,0,3,17,0,0,17,4,"4",1.5,2 -"yafc",-0.0272314962,0.4916391321,-0.3253666512,"https://salsa.debian.org/debian/yafc","https://github.com/sebastinas/yafc.git",4536.1716550926,4,14,0,13,27,0,0,28,3,"3",1.77777777777778,1.96428571428571 -"yagf-debian",1.2564818045,3.6319506109,0.2577483716,"https://github.com/tehnick/yagf-debian","https://github.com/tehnick/yagf-debian",2966.796875,2,1,0,2,3,0,0,3,2,"2",1.33333333333333,2 -"yagv",-0.2493109691,1.6805451528,-0.758268769,"https://salsa.debian.org/3dprinting-team/yagv","https://github.com/jonathanwin/yagv.git",1848.8749421296,0,6,0,2,24,0,0,24,1,"1",2,2 -"yajl",0.1436910943,0.8155419647,-0.0099540163,"https://github.com/jstamp/yajl","https://github.com/jstamp/yajl",5069.733125,7,28,0,22,4,0,0,23,4,"4",1.8,1.17391304347826 -"yubikey-personalization-gui-dpkg",1.0660214443,4.6214252569,-0.0477907414,"https://github.com/Yubico/yubikey-personalization-gui-dpkg","https://github.com/Yubico/yubikey-personalization-gui-dpkg",1527.8557986111,0,2,0,2,5,0,0,6,1,"1",2,1.83333333333333 -"yubikey-val-dpkg",-1.5796758821,0.5230579445,-2.2238855851,"https://github.com/Yubico/yubikey-val-dpkg","https://github.com/Yubico/yubikey-val-dpkg",2518.4995601852,1,7,0,6,3,0,0,6,1,"1",1.875,1.5 -"jay-yydebug",-2.4807565791,0.0572661247,-3.0016851771,"https://salsa.debian.org/java-team/yydebug","https://github.com/jruby/jay-yydebug",0.0429513889,0,1,0,1,2,0,0,3,1,"1",2,1.66666666666667 -"zc.lockfile",-0.0210256384,1.5379599647,-0.4550360225,"https://salsa.debian.org/python-team/packages/zc-lockfile","https://github.com/zopefoundation/zc.lockfile",5245.5974305556,1,13,0,10,19,0,0,22,4,"4",1.92857142857143,1.86363636363636 -"zed",-0.7636785221,-0.0586954945,-1.0152692364,"https://salsa.debian.org/ocaml-team/zed","https://github.com/ocaml-community/zed.git",4544.7564699074,9,14,0,17,38,0,0,40,3,"3",1.60869565217391,1.95 -"ice-debian-packaging",-0.2246270386,-0.0796274635,-0.3178149444,"https://github.com/zeroc-ice/ice-debian-packaging.git","https://github.com/zeroc-ice/ice-debian-packaging.git",2730.2990046296,3,11,0,8,6,0,0,13,1,"1",1.78571428571429,1.46153846153846 -"0install-debian",-0.1790173309,0.2373414985,-0.3531189648,"https://github.com/0install/0install-debian","https://github.com/0install/0install-debian",5324.6795949074,19,12,0,3,0,0,0,3,4,"4",1.38709677419355,1 -"zfSnap",0.4772336214,3.1494825406,-0.4433726935,"https://github.com/jgoerzen/zfSnap","https://github.com/jgoerzen/zfSnap",4429.3288888889,1,13,0,2,1,0,0,3,3,"3",1.92857142857143,1.33333333333333 -"zktop",-1.6834481359,1.4483848388,-2.5079762953,"https://salsa.debian.org/python-team/packages/zktop","https://github.com/phunt/zktop.git",4096.6100115741,1,12,0,7,20,0,0,20,3,"3",1.92307692307692,2 -"zope.deprecation",-0.4002923161,1.2950694538,-0.80228492,"https://salsa.debian.org/python-team/packages/zope.deprecation","https://github.com/zopefoundation/zope.deprecation.git",5564.8963541667,6,19,0,22,15,0,0,26,4,"4",1.76,1.57692307692308 -"zope.event",0.48012603,2.4451618465,-0.0440353103,"https://salsa.debian.org/debian/zope.event","https://github.com/zopefoundation/zope.event",5503.5143634259,6,21,0,23,14,0,0,26,4,"4",1.77777777777778,1.53846153846154 -"zope.i18nmessageid",-0.5047792742,1.175715823,-1.0038159767,"https://salsa.debian.org/detiste-guest/zope.i18nmessageid","https://github.com/zopefoundation/zope.i18nmessageid",5530.7271759259,3,23,0,23,15,0,0,30,4,"4",1.88461538461538,1.5 -"zope.schema",-0.6711277163,0.5898602563,-1.0326400015,"https://salsa.debian.org/python-team/packages/zope.schema","https://github.com/zopefoundation/zope.schema",5503.5836458333,8,46,0,42,30,0,0,56,4,"4",1.85185185185185,1.53571428571429 -"zope.testing",-0.8046398038,0.1932317872,-1.1600868609,"https://salsa.debian.org/python-team/packages/zope.testing","https://github.com/zopefoundation/zope.testing",5685.8682638889,3,42,0,37,13,0,0,40,4,"4",1.93333333333333,1.325 -"zope.testrunner",-1.5178214231,-0.9479425765,-1.6556150569,"https://salsa.debian.org/python-team/packages/zope.testrunner","https://github.com/zopefoundation/zope.testrunner",4988.3216666667,11,30,0,30,32,0,0,40,4,"4",1.73170731707317,1.8 -"zpb-ttf",-0.5400082597,2.49952862,-1.5901447095,"https://salsa.debian.org/debian/zpb-ttf","https://github.com/xach/zpb-ttf",4273.1460416667,0,6,0,4,14,0,0,14,3,"3",2,2 -"7kaa",0.8733439141,3.7651893226,-0.0927531106,"https://salsa.debian.org/games-team/7kaa","https://github.com/the3dfxdude/7kaa",5126.7096643519,24,23,0,27,66,0,0,78,4,"4",1.48936170212766,1.84615384615385 -"acmetool",0.6219434866,2.6875450321,-0.2336905662,"https://salsa.debian.org/go-team/packages/acmetool","https://github.com/hlandau/acmetool",2727.716875,7,20,1,21,258,0,5,263,1,"1",1.74074074074074,1.98098859315589 -"actiona",0.2685921276,2.3898449586,-0.5658267823,"https://salsa.debian.org/debian/actiona","https://github.com/Jmgr/actiona",4932.3205439815,3,17,0,3,94,0,0,95,3,"3",1.85,1.98947368421053 -"activemq",-0.707743979,-0.252194711,-0.929017814,"https://salsa.debian.org/java-team/activemq","https://github.com/apache/activemq",5739.1228356482,56,141,2,130,160,0,0,217,4,"4",1.71573604060914,1.73732718894009 -"allegro5",-0.4762686219,-0.2153924343,-0.5311269802,"https://salsa.debian.org/games-team/allegro5","https://github.com/liballeg/allegro5.git",5772.8158680556,110,47,0,79,223,0,5,242,4,"4",1.29936305732484,1.92148760330579 -"ariba",-0.7249708667,0.7497238838,-1.1789923052,"https://salsa.debian.org/med-team/ariba","https://github.com/sanger-pathogens/ariba",3026.1963541667,10,22,0,16,112,0,8,122,2,"2",1.6875,1.91803278688525 -"asn1crypto",0.9740729842,4.1853024005,0.0865816737,"https://salsa.debian.org/python-team/packages/asn1crypto","https://github.com/wbond/asn1crypto.git",3074.7355092593,14,27,0,32,181,0,0,181,2,"2",1.65853658536585,2 -"asymptote",0.2396900664,0.5861261584,0.0399132445,"https://github.com/debian-tex/asymptote","https://github.com/debian-tex/asymptote",4223.6715162037,6,28,0,5,4,0,0,6,3,"3",1.82352941176471,1.66666666666667 -"aranym800-debian",0.2438262875,1.4111848908,-0.3223074512,"https://github.com/bobek/aranym800-debian","https://github.com/bobek/aranym800-debian",4083.2988773148,1,3,0,2,2,0,0,2,3,"3",1.75,2 -"atril",0.5207732379,1.2869272543,0.1522121334,"https://salsa.debian.org/debian-mate-team/atril","https://github.com/mate-desktop/atril.git",4392.8799768519,62,42,0,70,244,0,0,278,3,"3",1.40384615384615,1.87769784172662 -"audacity",2.0595760921,2.587904003,1.6528933115,"https://salsa.debian.org/multimedia-team/audacity","https://github.com/audacity/audacity.git",5069.8878125,215,104,0,197,438,0,8,538,4,"4",1.32601880877743,1.81412639405204 -"audioread",0.4790726237,2.8379723664,-0.2363043324,"https://salsa.debian.org/python-team/packages/audioread","https://github.com/sampsyo/audioread.git",4407.0006944445,7,21,0,23,126,0,0,127,3,"3",1.75,1.99212598425197 -"autorandr",-0.3527152165,0.3171262846,-0.518389331,"https://salsa.debian.org/debian/autorandr","https://github.com/phillipberndt/autorandr.git",4779.7076736111,55,58,0,90,351,0,0,363,3,"3",1.51327433628319,1.96694214876033 -"autosuspend",-1.9250458428,0.6278109958,-2.4672708111,"https://salsa.debian.org/python-team/packages/autosuspend","https://github.com/languitar/autosuspend.git",3337.5962847222,6,9,0,13,40,0,0,46,2,"2",1.6,1.8695652173913 -"backuppc",0.439136868,0.738905733,0.2133448427,"https://salsa.debian.org/debian/backuppc","https://github.com/backuppc/backuppc",4883.1674305556,21,39,0,40,225,0,31,267,3,"3",1.65,1.84269662921348 -"rsync-bpc",-2.9537265247,0.2336355318,-3.706230506,"https://salsa.debian.org/debian/backuppc-rsync","https://github.com/backuppc/rsync-bpc",2751.3212037037,2,9,0,6,43,0,0,43,2,"2",1.81818181818182,2 -"bambam",0.3070932851,2.5075958172,-0.3413586452,"https://github.com/porridge/bambam","https://github.com/porridge/bambam",5711.2973958333,24,13,0,23,24,0,1,35,4,"4",1.35135135135135,1.68571428571429 -"barclay",0.1851801588,3.0141581768,-0.6020424346,"https://salsa.debian.org/java-team/barclay","https://github.com/broadinstitute/barclay.git",2356.7614351852,7,7,0,8,27,0,1,28,1,"1",1.5,1.96428571428571 -"bart",-0.177815138,2.1254373642,-0.6372145565,"https://salsa.debian.org/med-team/bart","https://github.com/mrirecon/bart",3390.8110185185,61,30,0,41,83,0,0,89,2,"2",1.32967032967033,1.93258426966292 -"bd",-0.5709314067,1.7639710855,-1.0717735964,"https://salsa.debian.org/debian/bd","https://github.com/vigneshwaranr/bd.git",3272.7792476852,3,12,0,10,56,0,0,57,2,"2",1.8,1.98245614035088 -"Bear",-0.3900185941,0.5954929997,-0.59709973,"https://salsa.debian.org/sramacher/bear","https://github.com/rizsotto/Bear",3987.655787037,44,19,0,53,142,0,2,183,3,"3",1.3015873015873,1.77595628415301 -"beginend",-0.9812054474,1.1475644093,-1.4790757004,"https://salsa.debian.org/emacsen-team/beginend-el","https://github.com/DamienCassou/beginend.git",3077.3105208333,8,12,0,15,21,0,0,21,2,"2",1.6,2 -"benchmark",-0.4007419552,1.9221150293,-1.2040622803,"https://salsa.debian.org/science-team/benchmark","https://github.com/google/benchmark",3640.5849537037,257,68,3,283,68,0,0,319,2,"2",1.20923076923077,1.21316614420063 -"abc",-0.0691799173,1.1526418635,-0.3926880632,"https://salsa.debian.org/science-team/berkeley-abc","https://github.com/berkeley-abc/abc.git",5782.9116666667,8,47,0,40,75,0,0,104,4,"4",1.85454545454545,1.72115384615385 -"bernhard",-3.8249138229,-1.4329465737,-4.33451812,"https://salsa.debian.org/python-team/packages/bernhard","https://github.com/b20n/bernhard.git",2059.4699652778,0,14,0,11,32,0,0,32,1,"1",2,2 -"betamax",-2.6186759503,-1.7111544465,-2.7929647164,"https://salsa.debian.org/python-team/packages/betamax","https://github.com/sigmavirus24/betamax",3448.4558796296,7,33,2,31,93,0,0,97,2,"2",1.825,1.95876288659794 -"bfs",-1.1164889975,-0.5498955731,-1.1990984125,"https://salsa.debian.org/lamby/pkg-bfs","https://github.com/tavianator/bfs.git",2311.7626273148,11,10,0,19,35,0,0,42,1,"1",1.47619047619048,1.83333333333333 -"birdfont",0.1539215818,1.5207071994,-0.3971310294,"https://salsa.debian.org/fonts-team/birdfont","https://github.com/johanmattssonm/birdfont.git",4158.8272222222,6,15,0,15,135,0,0,138,3,"3",1.71428571428571,1.97826086956522 -"bitlbee",0.610414917,1.1334179745,0.2390336103,"https://github.com/bitlbee/bitlbee","https://github.com/bitlbee/bitlbee",5775.5242824074,54,55,0,72,85,0,0,108,4,"4",1.5045871559633,1.78703703703704 -"black",-0.2598583165,0.6526555806,-0.4835804983,"https://salsa.debian.org/python-team/packages/black","https://github.com/psf/black.git",2098.4397453704,441,11,0,416,699,0,0,1009,1,"1",1.02433628318584,1.69276511397423 -"BOSSA",0.0893999446,1.6612263593,-0.4163524525,"https://salsa.debian.org/science-team/bossa","https://github.com/shumatech/BOSSA.git",3233.4649537037,7,26,0,19,214,0,0,214,2,"2",1.78787878787879,2 -"bowtie2",-0.4173214178,-0.233072452,-0.4693075159,"https://salsa.debian.org/med-team/bowtie2","https://github.com/BenLangmead/bowtie2",4656.6302777778,6,51,0,28,425,0,1,427,3,"3",1.89473684210526,1.99531615925059 -"boxbackup",-0.8371100115,0.0115481538,-1.3264648158,"https://salsa.debian.org/debian/boxbackup","https://github.com/boxbackup/boxbackup.git",5737.3015625,2,18,0,6,16,0,3,21,4,"4",1.9,1.76190476190476 -"breathe",-0.9912135008,-0.8309389737,-1.0391354827,"https://salsa.debian.org/python-team/packages/breathe","https://github.com/michaeljones/breathe.git",5375.5645949074,34,85,0,91,286,0,0,313,4,"4",1.71428571428571,1.91373801916933 -"brewtarget",0.484432121,2.8570200814,-0.426583819,"https://salsa.debian.org/debian/brewtarget","https://github.com/Brewtarget/brewtarget.git",5451.574212963,13,84,0,55,134,0,15,163,4,"4",1.8659793814433,1.82208588957055 -"brise",-0.3080442577,1.0357450106,-0.6873683492,"https://salsa.debian.org/debian/brise","https://github.com/rime/brise",2544.8862615741,5,23,0,12,45,0,0,45,1,"1",1.82142857142857,2 -"brlaser",0.4072432263,2.1541552875,-0.0102827943,"https://salsa.debian.org/printing-team/brlaser","https://github.com/pdewacht/brlaser",3342.2059837963,4,11,0,13,27,0,3,40,2,"2",1.73333333333333,1.675 -"brotli",0.1260775007,0.5454426052,-0.0083599615,"https://salsa.debian.org/debian/brotli","https://github.com/google/brotli",3713.0230555556,77,45,0,97,42,0,5,134,2,"2",1.36885245901639,1.3134328358209 -"bruteforce-luks",0.4506857269,3.9309060924,-0.3441057365,"https://salsa.debian.org/pkg-security-team/bruteforce-luks","https://github.com/glv2/bruteforce-luks",1977.6153125,2,8,0,3,38,0,0,39,1,"1",1.8,1.97435897435897 -"brutespray",-0.0085744737,2.0622651196,-0.445603786,"https://salsa.debian.org/pkg-security-team/brutespray","https://github.com/x90skysn3k/brutespray",2174.873599537,7,10,0,8,19,0,0,21,1,"1",1.58823529411765,1.9047619047619 -"bump2version",-0.6601711919,1.365143433,-1.1463637777,"https://salsa.debian.org/debian/bumpversion","https://github.com/c4urself/bump2version",3866.5811574074,20,43,3,48,254,0,0,265,3,"3",1.68253968253968,1.95849056603774 -"bundler",0.575011715,1.5392481898,0.1010337669,"https://salsa.debian.org/ruby-team/bundler","https://github.com/carlhuda/bundler",4417.961099537,292,766,15,370,17,0,0,383,3,"3",1.72400756143667,1.0443864229765 -"bzflag",0.8319129626,1.4300701689,0.417821043,"https://salsa.debian.org/games-team/bzflag","https://github.com/BZFlag-Dev/bzflag.git",5782.5434259259,11,63,0,19,30,0,4,39,4,"4",1.85135135135135,1.76923076923077 -"c-ares",0.3441298781,1.1916406284,0.0308943148,"https://salsa.debian.org/debian/c-ares","https://github.com/c-ares/c-ares.git",5778.6172222222,133,22,0,136,66,0,0,177,4,"4",1.14193548387097,1.3728813559322 -"caja",1.057062654,1.8090309876,0.5578935766,"https://salsa.debian.org/debian-mate-team/caja","https://github.com/mate-desktop/caja.git",4392.0400925926,58,63,0,86,70,0,0,143,3,"3",1.52066115702479,1.48951048951049 -"caja-actions",0.1964661335,2.0196315905,-0.3640114639,"https://salsa.debian.org/debian-mate-team/caja-actions","https://github.com/mate-desktop/caja-actions",4195.368599537,3,13,0,7,3,0,0,8,3,"3",1.8125,1.375 -"caja-admin",0.3402863165,2.9173444791,-0.2366884449,"https://salsa.debian.org/debian-mate-team/caja-admin","https://github.com/infirit/caja-admin",2910.0051851852,15,12,0,17,15,0,0,24,2,"2",1.44444444444444,1.625 -"caja-dropbox",1.4193798685,4.6529613875,0.2366380339,"https://salsa.debian.org/debian-mate-team/caja-dropbox","https://github.com/mate-desktop/caja-dropbox.git",4038.0196990741,13,26,0,25,33,0,0,46,3,"3",1.66666666666667,1.71739130434783 -"caja-extensions",0.9911860003,3.1294289964,0.1496506623,"https://salsa.debian.org/debian-mate-team/caja-extensions","https://github.com/mate-desktop/caja-extensions.git",3680.0453125,11,27,0,20,70,0,0,72,2,"2",1.71052631578947,1.97222222222222 -"caja-mediainfo-tab",-0.6346427686,1.4919485733,-1.2169751217,"https://salsa.debian.org/debian-mate-team/caja-mediainfo","https://github.com/linux-man/caja-mediainfo-tab",1186.6267013889,1,3,0,1,4,0,0,4,1,"1",1.75,2 -"caja-rename",0.3395336681,2.9850659825,-0.2433789434,"https://salsa.debian.org/debian-mate-team/caja-rename","https://github.com/tari01/caja-rename",1145.7519328704,25,4,0,19,9,0,0,26,1,"1",1.13793103448276,1.34615384615385 -"camlp4",0.1711187334,1.4277083804,-0.1545568318,"https://salsa.debian.org/ocaml-team/camlp4","https://github.com/ocaml/camlp4.git",5404.4002199074,6,40,0,37,92,0,7,112,4,"4",1.8695652173913,1.82142857142857 -"Camomile",-0.1749647414,0.504631672,-0.4116548857,"https://salsa.debian.org/ocaml-team/camomile","https://github.com/yoriyuki/Camomile.git",3699.9040972222,2,16,0,11,42,0,0,43,2,"2",1.88888888888889,1.97674418604651 -"camp",-0.0635736976,2.2422646477,-0.8678185189,"https://salsa.debian.org/med-team/camp","https://github.com/IRCAD/camp.git",3917.821412037,2,16,0,8,2,0,0,9,3,"3",1.88888888888889,1.22222222222222 -"can-utils",-0.3151818427,1.0524810842,-0.6128426897,"https://salsa.debian.org/debian/can-utils","https://github.com/linux-can/can-utils.git",5750.4572916667,42,46,0,66,298,0,0,305,4,"4",1.52272727272727,1.97704918032787 -"cftime",-0.053984567,2.1351568503,-0.4726880086,"https://salsa.debian.org/debian-gis-team/cftime/","https://github.com/Unidata/cftime",5698.2503472222,7,40,1,25,111,0,0,112,4,"4",1.85106382978723,1.99107142857143 -"Charm",-0.4441384118,1.2230812043,-0.8796829957,"https://salsa.debian.org/qt-kde-team/extras/charmtimetracker","https://github.com/KDAB/Charm",5169.2869097222,10,73,1,44,89,0,0,100,4,"4",1.87951807228916,1.89 -"chaussette",-2.3973132585,0.1079287529,-3.3352905378,"https://github.com/circus-tent/chaussette","https://github.com/circus-tent/chaussette",1782.6774768519,1,42,0,30,80,0,0,81,1,"1",1.97674418604651,1.98765432098765 -"selinux",-0.0767985152,0.1858102911,-0.1733620099,"https://salsa.debian.org/selinux-team/checkpolicy","https://github.com/SELinuxProject/selinux",5592.8363425926,179,30,0,124,83,0,12,182,4,"4",1.14354066985646,1.45604395604396 -"CheeseCutter",-0.8909922436,1.8346147461,-1.5014964432,"https://salsa.debian.org/multimedia-team/cheesecutter","https://github.com/theyamo/CheeseCutter",2936.8167824074,4,11,0,7,20,0,0,21,2,"2",1.73333333333333,1.95238095238095 -"cheetah3",0.2580754956,1.2098434945,-0.0894485619,"https://salsa.debian.org/python-team/packages/cheetah","https://github.com/CheetahTemplate3/cheetah3.git",5732.7751157407,17,23,0,34,45,0,0,61,4,"4",1.575,1.73770491803279 -"chemical-mime",0.9334467969,3.3064633303,0.1037865392,"https://salsa.debian.org/debichem-team/chemical-mime-data","https://github.com/dleidert/chemical-mime",3567.6745833333,0,2,0,1,4,0,0,5,2,"2",2,1.8 -"CheMPS2",-1.0331384848,-0.1979810762,-1.3111906152,"https://salsa.debian.org/debichem-team/chemps2","https://github.com/SebWouters/CheMPS2",3010.6861342593,0,9,0,4,35,0,0,35,2,"2",2,2 -"chromaprint",0.3600324626,1.3936683063,0.0316097075,"https://salsa.debian.org/multimedia-team/chromaprint","https://github.com/acoustid/chromaprint",4607.495162037,12,19,3,25,78,0,3,89,3,"3",1.61290322580645,1.87640449438202 -"chuck",1.0629400647,3.5097730621,-0.0355368923,"https://salsa.debian.org/debian/chuck","https://github.com/ccrma/chuck",4777.8660300926,19,55,0,45,92,0,1,108,3,"3",1.74324324324324,1.85185185185185 -"CiderWebmail",-0.6952594282,1.439044732,-1.4225189003,"https://salsa.debian.org/perl-team/modules/packages/ciderwebmail","https://github.com/CiderWebmail/CiderWebmail.git",5148.9571990741,1,13,0,5,11,0,0,12,4,"4",1.92857142857143,1.91666666666667 -"CiftiLib",-2.2337114106,-0.584429453,-2.6009802633,"https://salsa.debian.org/med-team/ciftilib","https://github.com/Washington-University/CiftiLib",3498.0756944445,2,7,0,5,8,0,0,8,2,"2",1.77777777777778,2 -"CImg",-0.3086549748,0.4682516606,-0.6897965127,"https://salsa.debian.org/science-team/cimg","https://github.com/GreycLab/CImg.git",3104.3731481482,1,34,0,11,150,0,2,161,2,"2",1.97142857142857,1.93167701863354 -"cinnamon-session",0.2019726211,0.7003204043,-0.0198993963,"https://salsa.debian.org/cinnamon-team/cinnamon-session","https://github.com/linuxmint/cinnamon-session.git",3830.8484259259,16,29,0,34,77,0,0,77,3,"3",1.64444444444444,2 -"citeproc-py",0.2650734109,3.200403032,-0.5379993649,"https://salsa.debian.org/python-team/packages/citeproc-py","https://github.com/brechtm/citeproc-py",4168.381087963,3,13,0,14,52,0,0,53,3,"3",1.8125,1.9811320754717 -"cJSON",-0.6378303304,1.1377366916,-1.0824295673,"https://salsa.debian.org/debian/cjson","https://github.com/DaveGamble/cJSON.git",4334.9435300926,37,63,0,76,105,0,0,162,3,"3",1.63,1.64814814814815 -"clasp",-0.3006037836,-0.1147250554,-0.3428180636,"https://salsa.debian.org/science-team/clasp","https://github.com/potassco/clasp",3296.9262847222,3,6,0,2,37,0,0,37,2,"2",1.66666666666667,2 -"classified-ads",-2.2983699343,-0.0320591619,-2.7796278861,"https://github.com/operatornormal/classified-ads","https://github.com/operatornormal/classified-ads",3053.9196180556,5,9,0,8,10,0,0,12,2,"2",1.64285714285714,1.83333333333333 -"cld2",0.6043981268,3.0399456446,-0.1481790802,"https://salsa.debian.org/debian/cld2","https://github.com/CLD2Owners/cld2",808.2021875,0,8,0,2,41,0,1,42,1,"1",2,1.97619047619048 -"clinfo",0.3372645422,1.6891188178,-0.1400560842,"https://salsa.debian.org/opencl-team/clinfo","https://github.com/Oblomov/clinfo",3809.3789236111,7,13,0,14,92,0,0,93,3,"3",1.65,1.98924731182796 -"ClipIt",1.4937392865,3.438028355,0.6071495445,"https://salsa.debian.org/debian/clipit","https://github.com/CristianHenzel/ClipIt.git",3780.8276736111,15,24,0,21,246,0,0,247,3,"3",1.61538461538462,1.99595141700405 -"cloc",0.3407193618,2.1059135948,-0.1842658951,"https://salsa.debian.org/debian/cloc","https://github.com/AlDanial/cloc.git",3014.5104282408,24,101,0,108,550,0,2,569,2,"2",1.808,1.96660808435852 -"cm-super",0.5096098115,1.5619464554,0.0498213871,"https://github.com/debian-tex/cm-super","https://github.com/debian-tex/cm-super",5018.3687962963,2,6,0,3,1,0,0,3,4,"4",1.75,1.33333333333333 -"cmatrix",1.2823687579,3.3153936495,0.3805014383,"https://salsa.debian.org/debian/cmatrix","https://github.com/abishekvashok/cmatrix.git",2359.866400463,20,18,0,32,137,0,2,148,1,"1",1.47368421052632,1.92567567567568 -"colmap",-0.7206786583,0.6412726598,-1.2145608955,"https://salsa.debian.org/tar/colmap","https://github.com/colmap/colmap",2802.2067824074,103,16,0,103,432,0,0,503,2,"2",1.1344537815126,1.85884691848907 -"comitup",-1.522007504,0.0892141487,-1.9480210845,"https://github.com/davesteele/comitup","https://github.com/davesteele/comitup",2830.0050115741,9,13,0,8,73,0,1,78,2,"2",1.59090909090909,1.93589743589744 -"cool-retro-term",-0.1638065917,2.2338371828,-0.670026222,"https://salsa.debian.org/tar/cool-retro-term","https://github.com/Swordfish90/cool-retro-term",3050.8032175926,23,53,0,57,1087,0,26,1115,2,"2",1.69736842105263,1.97488789237668 -"coq",1.0112440064,1.8992232667,0.4540481704,"https://salsa.debian.org/ocaml-team/coq","https://github.com/coq/coq",5785.2775347222,56,228,4,231,16,0,362,596,4,"4",1.80281690140845,1.02684563758389 -"CppAD",-0.3030038415,2.0775944536,-0.851490117,"https://salsa.debian.org/science-team/cppad","https://github.com/coin-or/CppAD",5756.9988773148,3,15,0,12,46,0,0,50,4,"4",1.83333333333333,1.92 -"cppo",-1.4562480515,0.6841532188,-1.9614183142,"https://salsa.debian.org/ocaml-team/cppo","https://github.com/mjambon/cppo.git",1459.7919444445,3,28,0,18,53,0,0,53,1,"1",1.90322580645161,2 -"cppreference-doc-debian",0.7174863837,3.9751588838,-0.3114715055,"https://github.com/p12tic/cppreference-doc-debian","https://github.com/p12tic/cppreference-doc-debian",3405.6815740741,2,6,0,5,7,0,0,8,2,"2",1.75,1.875 -"CPU-X",-0.1831351513,2.2662774746,-0.7177695187,"https://salsa.debian.org/debian/cpu-x","https://github.com/X0rg/CPU-X.git",2770.4909606482,196,13,0,145,32,0,3,177,2,"2",1.0622009569378,1.18079096045198 -"cqrlib",-0.1411361724,1.4544569834,-0.4267040837,"https://salsa.debian.org/science-team/cqrlib","https://github.com/yayahjb/cqrlib.git",2926.9641203704,0,1,0,1,3,0,0,3,2,"2",2,2 -"critcl",0.1685050423,4.7425882465,-1.273547806,"https://salsa.debian.org/tcltk-team/critcl","https://github.com/andreas-kupries/critcl",5635.5840046296,1,15,2,12,40,0,0,43,4,"4",1.9375,1.93023255813953 -"CsoundQt",-0.414726718,0.4957472098,-0.6101873218,"https://salsa.debian.org/multimedia-team/csoundqt","https://github.com/CsoundQt/CsoundQt",5612.1172222222,7,49,3,16,87,0,7,97,4,"4",1.875,1.89690721649485 -"ctemplate",0.2254790855,1.2754696215,-0.1533076819,"https://salsa.debian.org/qt-kde-team/3rdparty/ctemplate","https://github.com/OlafvdSpek/ctemplate.git",5604.6906481482,3,11,0,8,43,0,0,44,4,"4",1.78571428571429,1.97727272727273 -"CubicSDR",0.1018461625,2.3388993412,-0.4986845369,"https://salsa.debian.org/debian-hamradio-team/cubicsdr","https://github.com/cjcliffe/CubicSDR.git",3287.5204976852,11,22,0,0,330,0,18,348,2,"2",1.66666666666667,1.94827586206897 -"custodia",-1.6751213621,-0.0779781476,-2.2266335422,"https://salsa.debian.org/freeipa-team/custodia","https://github.com/latchset/custodia.git",2105.2031134259,10,5,0,11,30,0,0,30,1,"1",1.33333333333333,2 -"cvxopt",0.2544257296,0.9059783526,-0.0500804801,"https://salsa.debian.org/science-team/cvxopt","https://github.com/cvxopt/cvxopt",3827.9446875,7,5,0,7,228,0,0,228,3,"3",1.41666666666667,2 -"cyrus-sasl",1.1677078747,1.456798419,0.9287245609,"https://salsa.debian.org/debian/cyrus-sasl2","https://github.com/cyrusimap/cyrus-sasl.git",5510.1634606482,61,36,0,68,147,0,0,171,4,"4",1.37113402061856,1.85964912280702 -"dashel",-0.5070603207,1.8556035661,-1.0587894431,"https://salsa.debian.org/science-team/dashel.git","https://github.com/aseba-community/dashel.git",4686.2267708333,3,17,0,11,13,0,0,15,3,"3",1.85,1.86666666666667 -"dbab",-1.9903650996,-0.4617475154,-2.5099356053,"https://salsa.debian.org/debian/dbab","https://github.com/suntong/dbab.git",3490.7212037037,1,6,0,4,7,0,1,10,2,"2",1.85714285714286,1.7 -"dcfldd",0.243299676,1.5128715597,-0.1742035117,"https://salsa.debian.org/debian/dcfldd","https://github.com/resurrecting-open-source-projects/dcfldd",1555.0382175926,1,5,0,4,11,0,0,11,1,"1",1.83333333333333,2 -"dcmstack",-0.2179064003,2.3843724616,-1.1543074519,"https://salsa.debian.org/med-team/dcmstack","https://github.com/moloney/dcmstack.git",4236.057650463,2,11,0,8,50,0,0,51,3,"3",1.84615384615385,1.98039215686275 -"ddccontrol-db",0.5375899278,3.040666398,-0.2040495598,"https://salsa.debian.org/debian/ddccontrol-db","https://github.com/ddccontrol/ddccontrol-db",5706.4213541667,83,21,0,89,218,0,0,220,4,"4",1.20192307692308,1.99090909090909 -"ddclient",2.2300979217,3.0092386237,1.6657756531,"https://salsa.debian.org/debian/ddclient","https://github.com/ddclient/ddclient.git",5769.1157986111,45,69,0,89,144,0,7,199,4,"4",1.60526315789474,1.72361809045226 -"debiman",-2.0205023232,-0.3691368262,-2.3529854163,"https://salsa.debian.org/go-team/packages/debiman","https://github.com/Debian/debiman.git",2469.6214583333,11,3,0,12,58,0,0,61,1,"1",1.21428571428571,1.95081967213115 -"deepdiff",-0.60032076,1.9943773022,-1.1853796171,"https://salsa.debian.org/python-team/packages/deepdiff","https://github.com/seperman/deepdiff.git",3349.8121875,21,67,0,59,387,0,0,390,2,"2",1.76136363636364,1.99230769230769 -"dehydrated-hook-ddns-tsig",-1.1498688177,0.3234067787,-1.4723938378,"https://salsa.debian.org/letsencrypt-team/dehydrated-hook-ddns-tsig","https://github.com/eferdman/dehydrated-hook-ddns-tsig.git",613.6095601852,3,7,0,5,13,0,0,13,1,"1",1.7,2 -"deken",-0.1773993382,1.8798950337,-0.6127948533,"https://salsa.debian.org/multimedia-team/pd/deken","https://github.com/pure-data/deken",3169.7776041667,5,17,1,9,50,0,0,50,2,"2",1.77272727272727,2 -"derpconf",-2.1632661335,-0.2479529966,-2.7160545081,"https://salsa.debian.org/python-team/packages/derpconf","https://github.com/globocom/derpconf",4088.1859490741,0,19,0,10,21,0,0,23,3,"3",2,1.91304347826087 -"detachtty",0.7286668661,3.7996202071,-0.4663424257,"https://salsa.debian.org/debian/detachtty","https://github.com/cosmos72/detachtty.git",5063.0382175926,2,3,0,4,4,0,0,5,4,"4",1.6,1.8 -"detox",0.0760137719,1.2444609771,-0.236573077,"https://salsa.debian.org/debian/detox","https://github.com/dharple/detox",2472.5849305556,3,6,0,5,44,0,0,44,1,"1",1.66666666666667,2 -"devtodo",-0.0964373601,0.5231337283,-0.4667575617,"https://salsa.debian.org/debian/devtodo","https://github.com/alecthomas/devtodo",4517.7004398148,2,2,0,1,5,0,0,5,3,"3",1.5,2 -"dfc",0.6249482733,2.6923246378,-0.1060154397,"https://salsa.debian.org/debian/dfc","https://github.com/rolinh/dfc",3944.7026157408,10,7,0,15,23,0,0,28,3,"3",1.41176470588235,1.82142857142857 -"dhcpcd-dbus",0.116885126,3.4089949811,-0.7932984933,"https://salsa.debian.org/debian/dhcpcd-dbus","https://github.com/kobolabs/dhcpcd-dbus.git",4098.2566550926,2,6,0,3,0,0,0,3,3,"3",1.75,1 -"dhcpcd-ui",-0.0122872414,2.5695283858,-0.8367345755,"https://salsa.debian.org/debian/dhcpcd-ui","https://github.com/NetworkConfiguration/dhcpcd-ui",5203.8271875,4,2,0,5,0,0,0,5,4,"4",1.33333333333333,1 -"dhcpcd",0.6815852227,1.5374108,0.1969854249,"https://salsa.debian.org/debian/dhcpcd","https://github.com/NetworkConfiguration/dhcpcd.git",5784.3856944445,64,17,0,56,18,0,0,59,4,"4",1.20987654320988,1.30508474576271 -"dhcpdump",1.4490750412,4.1456331911,0.3872406438,"https://github.com/bbonev/dhcpdump","https://github.com/bbonev/dhcpdump",112.9948032407,0,3,0,2,3,0,0,3,1,"1",2,2 -"DHCPig",-0.9872435316,1.3324162128,-1.5205038766,"https://salsa.debian.org/pkg-security-team/dhcpig","https://github.com/kamorin/DHCPig",1930.9329398148,0,7,0,7,22,0,0,24,1,"1",2,1.91666666666667 -"dhewm3",-0.2903203144,1.9161738096,-0.7863581959,"https://salsa.debian.org/games-team/dhewm3","https://github.com/dhewm/dhewm3.git",4378.332974537,36,21,0,41,120,0,7,144,3,"3",1.36842105263158,1.83333333333333 -"diffuse",0.6569991928,3.1825265926,-0.1258422859,"https://salsa.debian.org/debian/diffuse","https://github.com/MightyCreak/diffuse.git",2779.0936226852,15,12,0,21,61,0,0,61,2,"2",1.44444444444444,2 -"dill",-0.0692957122,2.3594211277,-0.5014890362,"https://salsa.debian.org/python-team/packages/dill","https://github.com/uqfoundation/dill",5216.8620486111,22,27,2,41,513,0,0,513,4,"4",1.55102040816327,2 -"direwolf",-0.1430216901,1.3707430635,-0.6200279656,"https://salsa.debian.org/debian-hamradio-team/direwolf","https://github.com/wb2osz/direwolf",2351.9412615741,7,18,1,0,251,0,1,252,1,"1",1.72,1.99603174603175 -"django-auth-ldap",-0.7351113605,0.589742959,-1.162005947,"https://salsa.debian.org/python-team/packages/django-auth-ldap","https://github.com/django-auth-ldap/django-auth-ldap.git",5095.4516550926,18,22,0,24,215,0,0,223,4,"4",1.55,1.96412556053812 -"django-classy-tags",-0.7401841635,0.9848619547,-1.3980531867,"https://salsa.debian.org/python-team/packages/django-classy-tags","https://github.com/django-cms/django-classy-tags",4877.1677893519,15,16,2,22,70,0,0,70,3,"3",1.51612903225806,2 -"django-countries",-0.5347084486,1.3547470964,-1.2788572175,"https://salsa.debian.org/python-team/packages/django-countries","https://github.com/SmileyChris/django-countries",4972.680625,16,45,0,50,303,0,0,314,3,"3",1.73770491803279,1.96496815286624 -"django-fsm",-1.2455924049,1.7684823777,-1.9508426508,"https://salsa.debian.org/python-team/packages/django-fsm","https://github.com/viewflow/django-fsm",4622.1760763889,28,45,0,58,257,0,0,258,3,"3",1.61643835616438,1.99612403100775 -"django-haystack",-0.3668845966,1.4515254842,-0.931809609,"https://salsa.debian.org/python-team/packages/django-haystack","https://github.com/django-haystack/django-haystack",5440.2651388889,100,135,5,183,156,0,0,323,4,"4",1.57446808510638,1.48297213622291 -"pkg-django-hijack",-2.1622270176,0.0257030995,-2.8657585957,"https://github.com/Linaro/pkg-django-hijack.git","https://github.com/Linaro/pkg-django-hijack.git",1013.9897106482,0,2,0,1,0,0,0,1,1,"1",2,1 -"django-housekeeping",-0.869454572,1.948090224,-1.6153462575,"https://salsa.debian.org/python-team/packages/django-housekeeping","https://github.com/spanezz/django-housekeeping.git",2311.2066087963,0,4,0,3,4,0,0,5,1,"1",2,1.8 -"django-ipware",-0.186701027,3.4775277787,-1.1364140371,"https://salsa.debian.org/python-team/packages/django-ipware","https://github.com/un33k/django-ipware",3876.7555324074,23,8,0,26,86,0,1,87,3,"3",1.25806451612903,1.98850574712644 -"django-modeltranslation",-1.5133383269,0.6332844289,-2.2136337591,"https://salsa.debian.org/python-team/packages/django-modeltranslation","https://github.com/deschler/django-modeltranslation.git",5393.628900463,39,78,0,93,559,0,1,562,4,"4",1.66666666666667,1.99466192170819 -"django-polymorphic",-0.9862725279,0.7261077657,-1.6214857875,"https://salsa.debian.org/python-team/packages/django-polymorphic","https://github.com/django-polymorphic/django-polymorphic",5078.6096990741,41,80,1,100,253,0,0,305,4,"4",1.66115702479339,1.82950819672131 -"django-prometheus",-2.2603160573,-0.4381341974,-2.7422527304,"https://salsa.debian.org/python-team/packages/django-prometheus","https://github.com/korfuri/django-prometheus",3173.3548148148,32,30,0,50,294,0,0,294,2,"2",1.48387096774194,2 -"django-python3-ldap",-1.220695241,0.9816108419,-1.7104148484,"https://salsa.debian.org/python-team/packages/django-python3-ldap","https://github.com/etianen/django-python3-ldap",3090.7084259259,4,28,0,25,204,0,0,208,2,"2",1.875,1.98076923076923 -"django-sitetree",-1.1970109861,0.3805270522,-1.67880198,"https://salsa.debian.org/python-team/packages/django-sitetree","https://github.com/idlesign/django-sitetree",4549.666712963,6,42,0,36,185,0,0,185,3,"3",1.875,2 -"django-sortedm2m",-2.3457198242,-0.0825384392,-2.7865717155,"https://salsa.debian.org/python-team/packages/django-sortedm2m","https://github.com/jazzband/django-sortedm2m.git",4988.0868287037,13,51,0,48,177,0,0,178,4,"4",1.796875,1.99438202247191 -"dma",0.9255897857,2.1311120692,0.2618365609,"https://salsa.debian.org/debian/dma","https://github.com/corecode/dma.git",4350.2836574074,26,18,0,30,98,0,0,99,3,"3",1.40909090909091,1.98989898989899 -"dmrconfig",-4.4180298219,-0.9106394342,-5.3737002754,"https://salsa.debian.org/debian-hamradio-team/dmrconfig","https://github.com/OpenRTX/dmrconfig.git",1907.596412037,5,9,0,11,74,0,2,76,1,"1",1.64285714285714,1.97368421052632 -"dnspython",1.1275058498,2.6742605707,0.4158531709,"https://salsa.debian.org/python-team/packages/dnspython","https://github.com/rthalley/dnspython.git",5665.3041087963,41,93,0,107,427,0,2,460,4,"4",1.69402985074627,1.92826086956522 -"dnsruby",-0.234176424,1.5390828902,-0.6784148131,"https://salsa.debian.org/ruby-team/ruby-dnsruby","https://github.com/alexdalitz/dnsruby.git",5594.1314467593,4,31,0,23,77,0,3,82,4,"4",1.88571428571429,1.9390243902439 -"Doris",-3.2514630416,-2.7560514844,-3.3329815998,"https://salsa.debian.org/debian-gis-team/doris","https://github.com/TUDelftGeodesy/Doris",371.9438888889,0,6,0,3,31,0,0,33,1,"1",2,1.93939393939394 -"dosage",-0.7866623156,0.1614581475,-1.1313932158,"https://salsa.debian.org/debian/dosage","https://github.com/webcomics/dosage",4186.6960185185,22,40,1,51,112,0,0,122,3,"3",1.64516129032258,1.91803278688525 -"dosfstools",0.9576699829,1.4464254542,0.6170237773,"https://salsa.debian.org/debian/dosfstools","https://github.com/dosfstools/dosfstools.git",3911.4083101852,49,15,0,39,137,0,0,155,3,"3",1.234375,1.88387096774194 -"dpmb",-0.6691898306,1.5148767963,-1.1659559787,"https://github.com/dpmb/dpmb","https://github.com/dpmb/dpmb",3025.1458101852,5,11,1,7,14,0,0,15,2,"2",1.6875,1.93333333333333 -"dq",-0.1834293154,2.1580450192,-0.7499592676,"https://salsa.debian.org/debian/dq","https://github.com/janmojzis/dq.git",2922.0256712963,0,7,0,1,3,0,0,3,2,"2",2,2 -"drf-extensions",-1.5711074271,0.582669346,-2.2334265763,"https://salsa.debian.org/python-team/packages/drf-extensions","https://github.com/chibisov/drf-extensions.git",3758.3081018519,37,33,0,52,293,0,0,293,2,"2",1.47142857142857,2 -"drf-generators",-1.0791841561,1.9108535938,-1.8015507649,"https://salsa.debian.org/python-team/packages/drf-generators","https://github.com/brobin/drf-generators",1981.457962963,4,10,0,9,39,0,0,39,1,"1",1.71428571428571,2 -"driftnet",-0.3021441377,0.4582796981,-0.6160981524,"https://github.com/deiv/driftnet","https://github.com/deiv/driftnet",3936.0659722222,4,6,0,5,58,0,0,58,3,"3",1.6,2 -"drmaa-python",-0.9229869282,0.8943517279,-1.5388923357,"https://salsa.debian.org/med-team/drmaa","https://github.com/pygridtools/drmaa-python",3564.105462963,9,12,0,13,58,0,4,63,2,"2",1.57142857142857,1.92063492063492 -"drmips",-0.9190476493,1.6685906624,-1.6412123268,"https://github.com/brunonova/drmips/tree/debian","https://github.com/brunonova/drmips",3165.66125,3,3,0,4,0,0,0,4,2,"2",1.5,1 -"dropbear",0.4812175514,0.9754576643,0.1540354658,"https://salsa.debian.org/debian/dropbear","https://github.com/mkj/dropbear",5772.037037037,39,54,0,67,213,0,0,225,4,"4",1.58064516129032,1.94666666666667 -"dropwatch",-1.1991262604,1.5250708737,-1.8285406941,"https://salsa.debian.org/debian/dropwatch","https://github.com/nhorman/dropwatch",5326.1496296296,3,24,0,17,70,0,0,72,4,"4",1.88888888888889,1.97222222222222 -"dunst",0.3669983163,1.1637822615,0.0070676604,"https://salsa.debian.org/debian/dunst","https://github.com/dunst-project/dunst",4447.0045601852,43,111,1,126,562,0,26,653,3,"3",1.72077922077922,1.86064318529862 -"DustRacing2D",0.1730330143,3.1219082568,-0.6411485316,"https://salsa.debian.org/pino/dustrac","https://github.com/juzzlin/DustRacing2D.git",4428.4226851852,8,9,0,11,36,0,1,37,3,"3",1.52941176470588,1.97297297297297 -"e2guardian",-0.4962046033,0.8559279449,-0.8848150366,"https://salsa.debian.org/debian-edu-pkg-team/e2guardian","https://github.com/e2guardian/e2guardian",3743.8510416667,10,60,4,20,68,0,4,84,2,"2",1.85714285714286,1.80952380952381 -"editorconfig-core-c",1.5887281662,4.6075180153,0.4803432984,"https://salsa.debian.org/debian/editorconfig-core","https://github.com/editorconfig/editorconfig-core-c.git",4345.1404861111,23,19,0,32,52,0,2,54,3,"3",1.45238095238095,1.96296296296296 -"editra",-0.2633359349,1.1859959258,-0.7394398489,"https://github.com/mogaal/editra","https://github.com/mogaal/editra",1762.9254398148,0,2,0,1,2,0,0,3,1,"1",2,1.66666666666667 -"efivar",1.2395472847,3.1409084649,0.4366490781,"https://salsa.debian.org/efi-team/efivar","https://github.com/rhinstaller/efivar.git",3854.9068634259,62,9,0,62,181,0,0,184,3,"3",1.12676056338028,1.98369565217391 -"eggdrop-debian",0.690268777,1.6966766009,0.0747126473,"https://github.com/yastupin/eggdrop-debian","https://github.com/yastupin/eggdrop-debian",1023.9554166667,0,1,0,1,2,0,0,2,1,"1",2,2 -"egl-wayland",0.0316178932,1.8159648449,-0.3538526989,"https://salsa.debian.org/debian/egl-wayland","https://github.com/NVIDIA/egl-wayland.git",2464.5272800926,13,9,0,14,170,0,0,172,1,"1",1.40909090909091,1.98837209302326 -"eiciel",-0.3913934912,0.2845531206,-0.6225036497,"https://salsa.debian.org/debian/eiciel","https://github.com/rofirrim/eiciel",4391.8161689815,58,10,0,42,13,0,0,46,3,"3",1.14705882352941,1.28260869565217 -"eiskaltdcpp-debian",0.4505650107,2.0973490193,-0.2886793088,"https://github.com/eiskaltdcpp/eiskaltdcpp-debian","https://github.com/eiskaltdcpp/eiskaltdcpp-debian",3513.9242361111,0,2,0,2,3,0,0,3,2,"2",2,2 -"eja",-2.7925237394,1.0154047624,-3.9912920842,"https://github.com/ubaldus/eja","https://github.com/ubaldus/eja",3036.7696296296,0,5,0,3,3,0,0,4,2,"2",2,1.75 -"elastalert",-2.7490522153,-1.0382477163,-3.253107753,"https://salsa.debian.org/debian/elastalert","https://github.com/Yelp/elastalert.git",2822.0809490741,46,241,0,181,234,0,4,371,2,"2",1.8397212543554,1.63072776280323 -"emacs-git-messenger",-0.7394110957,1.3440255665,-1.1759453412,"https://salsa.debian.org/emacsen-team/emacs-git-messenger","https://github.com/syohex/emacs-git-messenger.git",3062.6,2,8,0,7,23,0,0,23,2,"2",1.8,2 -"git-modes",-0.5095691095,1.8818747091,-0.9450708252,"https://salsa.debian.org/emacsen-team/emacs-git-modes","https://github.com/magit/git-modes.git",4898.4598032408,8,34,0,39,64,0,0,75,3,"3",1.80952380952381,1.85333333333333 -"emacs-jedi",-0.5925564326,1.6685968963,-1.0626804159,"https://salsa.debian.org/emacsen-team/emacs-jedi","https://github.com/tkf/emacs-jedi.git",3462.8411458333,5,28,0,30,288,0,2,290,2,"2",1.84848484848485,1.99310344827586 -"emacspeak",-0.3098123339,0.154967146,-0.6063949443,"https://salsa.debian.org/a11y-team/emacspeak","https://github.com/tvraman/emacspeak.git",5784.5154976852,1,16,0,7,53,0,0,53,4,"4",1.94117647058824,2 -"enchant",0.4671232701,2.6138489169,-0.0641062097,"https://salsa.debian.org/gnome-team/enchant-2/","https://github.com/AbiWord/enchant.git",5773.2183333333,7,27,0,26,105,0,1,112,4,"4",1.79411764705882,1.9375 -"engrampa",0.3364707225,1.2009801373,-0.0018104828,"https://salsa.debian.org/debian-mate-team/engrampa","https://github.com/mate-desktop/engrampa.git",4345.1016319445,27,39,0,38,189,0,0,191,3,"3",1.59090909090909,1.98952879581152 -"erlware_commons",-1.8744095819,0.8786023846,-2.6652549432,"https://salsa.debian.org/erlang-team/packages/erlang-erlware-commons","https://github.com/erlware/erlware_commons.git",4657.9532060185,8,37,0,28,72,0,0,72,3,"3",1.82222222222222,2 -"folsom",-1.800386042,0.5181389354,-2.3318647887,"https://salsa.debian.org/erlang-team/packages/erlang-folsom","https://github.com/boundary/folsom.git",1470.0027777778,3,37,0,30,72,0,0,75,1,"1",1.925,1.96 -"jiffy",0.1668501203,2.4255381931,-0.3758394191,"https://salsa.debian.org/erlang-team/packages/erlang-jiffy","https://github.com/davisp/jiffy.git",3978.8049884259,23,14,0,27,227,0,0,227,3,"3",1.37837837837838,2 -"erlang-jose",-0.0923635531,2.3327857993,-0.5705493125,"https://salsa.debian.org/ejabberd-packaging-team/erlang-jose","https://github.com/potatosalad/erlang-jose.git",3054.6266782407,10,30,0,29,125,0,0,125,2,"2",1.75,2 -"lager",0.1330257958,2.1705993041,-0.3821435959,"https://salsa.debian.org/ejabberd-packaging-team/erlang-lager","https://github.com/erlang-lager/lager.git",4513.8316435185,17,130,0,101,372,0,1,377,3,"3",1.8843537414966,1.9867374005305 -"meck",-1.7847622485,-0.6288022984,-2.0590391976,"https://salsa.debian.org/erlang-team/packages/erlang-meck","https://github.com/eproxus/meck.git",4901.9858333333,34,45,0,52,158,0,9,176,3,"3",1.56962025316456,1.89772727272727 -"fast_tls",-0.157152573,1.1095215195,-0.4106607165,"https://salsa.debian.org/ejabberd-packaging-team/erlang-p1-tls","https://github.com/processone/fast_tls.git",3904.2279282408,5,26,0,18,52,0,0,56,3,"3",1.83870967741935,1.92857142857143 -"eredis",-0.9857886966,1.2120613864,-1.431244437,"https://salsa.debian.org/ejabberd-packaging-team/erlang-redis-client","https://github.com/wooga/eredis.git",2851.9773842593,2,48,0,34,122,0,0,123,2,"2",1.96,1.99186991869919 -"eshell-git-prompt",-0.9609411721,1.6959194934,-1.5424020682,"https://salsa.debian.org/emacsen-team/eshell-git-prompt","https://github.com/xuchunyang/eshell-git-prompt.git",2545.7433564815,1,11,0,6,11,0,0,11,1,"1",1.91666666666667,2 -"espeakup",-0.5060781696,0.017914626,-0.7493763311,"https://salsa.debian.org/a11y-team/espeakup","https://github.com/williamh/espeakup",4725.7581134259,2,6,0,4,0,0,0,4,3,"3",1.75,1 -"ettercap",0.3516997318,0.9604770242,0.005454292,"https://salsa.debian.org/pkg-security-team/ettercap","https://github.com/Ettercap/ettercap.git",4364.9420717593,13,80,0,48,36,0,12,84,3,"3",1.86021505376344,1.42857142857143 -"evilwm",0.1058350749,1.7709141502,-0.5887613795,"https://github.com/mati75/evilwm.git","https://github.com/mati75/evilwm.git",3558.3624189815,0,7,0,4,4,0,0,5,2,"2",2,1.8 -"evqueue-core",-3.8008904307,0.0055401804,-5.0310894983,"https://github.com/coldsource/evqueue-core","https://github.com/coldsource/evqueue-core",3176.9503935185,0,23,0,4,7,0,1,9,2,"2",2,1.77777777777778 -"exabgp",-0.5661496323,0.4143666278,-0.9529715,"https://github.com/Exa-Networks/exabgp/tree/debian/sid","https://github.com/Exa-Networks/exabgp",5211.7322222222,28,135,5,103,93,0,40,211,4,"4",1.82822085889571,1.44075829383886 -"f3",0.2679415625,2.6534869606,-0.2923376765,"https://salsa.debian.org/debian/f3","https://github.com/AltraMayor/f3.git",4281.9233912037,11,29,0,36,202,0,0,206,3,"3",1.725,1.98058252427184 -"fabric",0.2361201884,1.1224452265,-0.2395604756,"https://salsa.debian.org/python-team/packages/fabric","https://github.com/fabric/fabric.git",5703.0252199074,79,121,0,17,660,0,0,672,4,"4",1.605,1.98214285714286 -"fastkml",-1.1512391887,1.6385429324,-1.936594667,"https://salsa.debian.org/python-team/packages/fastkml","https://github.com/cleder/fastkml",4190.9523148148,13,36,2,36,109,0,0,110,3,"3",1.73469387755102,1.99090909090909 -"fceux",3.1366942055,8.4703461382,1.4758017291,"https://salsa.debian.org/games-team/fceux","https://github.com/TASEmulators/fceux.git",5697.8923611111,20,74,0,39,179,0,0,185,4,"4",1.78723404255319,1.96756756756757 -"fence-agents",-0.0526755775,0.7306960785,-0.3413654082,"https://salsa.debian.org/ha-team/fence-agents","https://github.com/ClusterLabs/fence-agents",5742.9759722222,67,106,0,112,160,0,0,195,4,"4",1.61271676300578,1.82051282051282 -"pkg-ferm",1.1755791706,1.9154949013,0.6944760141,"https://github.com/formorer/pkg-ferm","https://github.com/formorer/pkg-ferm",1766.1921643519,3,2,0,3,7,0,0,9,1,"1",1.4,1.77777777777778 -"ffindex",-0.3841947458,0.7848746806,-0.7256317717,"https://salsa.debian.org/med-team/ffindex","https://github.com/ahcm/ffindex.git",4107.5377777778,1,9,0,2,4,0,1,6,3,"3",1.9,1.66666666666667 -"ffmpegthumbnailer",0.6218339,1.7026039531,0.1299334729,"https://salsa.debian.org/multimedia-team/ffmpegthumbnailer","https://github.com/dirkvdb/ffmpegthumbnailer",5750.9852893519,2,26,0,21,32,0,0,49,4,"4",1.92857142857143,1.6530612244898 -"fftw3",0.5606957848,1.057025995,0.2642840796,"https://salsa.debian.org/science-team/fftw3","https://github.com/FFTW/fftw3.git",5716.0486458333,17,23,0,31,333,0,2,338,4,"4",1.575,1.98520710059172 -"FileTea",-1.4880291168,-0.5976104943,-1.6869426547,"https://salsa.debian.org/berto/filetea","https://github.com/elima/FileTea",2414.4586111111,4,1,0,2,17,0,0,18,1,"1",1.2,1.94444444444444 -"filtergen",-1.4900593021,-0.2527170414,-2.0161816495,"https://github.com/jaqx0r/filtergen/tree/debian","https://github.com/jaqx0r/filtergen",4988.9503125,3,6,0,2,5,0,0,5,4,"4",1.66666666666667,2 -"findimagedupes",0.1571397257,1.014130714,-0.2428383842,"https://salsa.debian.org/science-team/findimagedupes","https://github.com/jhnc/findimagedupes.git",5609.2984837963,0,1,0,0,16,0,0,16,4,"4",2,2 -"Fiona",-0.4518295489,0.0316996689,-0.548290247,"https://salsa.debian.org/debian-gis-team/fiona","https://github.com/Toblerity/Fiona.git",2732.0256712963,42,33,0,64,34,0,1,91,1,"1",1.44,1.37362637362637 -"firehol",0.2337473723,0.6567606394,-0.0568826659,"https://salsa.debian.org/debian/firehol","https://github.com/firehol/firehol",5475.3480324074,8,33,1,24,278,0,16,297,4,"4",1.80487804878049,1.93602693602694 -"flask-mongoengine",-1.2847143273,1.6755709624,-2.0678485801,"https://salsa.debian.org/python-team/packages/flask-mongoengine","https://github.com/mongoengine/flask-mongoengine",4513.2838078704,18,81,5,71,356,0,0,361,3,"3",1.81818181818182,1.98614958448753 -"flask-openid",0.228453383,2.6597609885,-0.3213084888,"https://salsa.debian.org/python-team/packages/flask-openid","https://github.com/mitsuhiko/flask-openid.git",4219.2356481482,6,12,0,12,96,0,0,97,3,"3",1.66666666666667,1.98969072164948 -"flask-restful",0.34791132,1.6712629803,-0.0854278525,"https://salsa.debian.org/python-team/packages/flask-restful","https://github.com/flask-restful/flask-restful",3867.9860763889,52,124,0,135,573,0,0,611,3,"3",1.70454545454545,1.93780687397709 -"flatbuffers",-1.160445057,0.9112660212,-1.581988532,"https://salsa.debian.org/debian/flatbuffers","https://github.com/google/flatbuffers.git",3592.7395138889,597,121,0,431,19,0,6,452,2,"2",1.16852367688022,1.04203539823009 -"flim",0.7666961285,1.9591073504,0.1611787583,"https://salsa.debian.org/debian/flim","https://github.com/wanderlust/flim",5370.129212963,4,13,0,8,10,0,0,12,4,"4",1.76470588235294,1.83333333333333 -"arb",0.2828492531,2.1064015572,-0.2652901459,"https://salsa.debian.org/math-team/flint-arb","https://github.com/fredrik-johansson/arb",4241.2918865741,4,42,0,34,106,0,1,108,3,"3",1.91304347826087,1.98148148148148 -"FlintQS",0.8705325607,4.2184408876,-0.1229863815,"https://salsa.debian.org/science-team/flintqs","https://github.com/sagemath/FlintQS",2671.3606365741,0,2,0,2,2,0,0,3,1,"1",2,1.66666666666667 -"flite",0.3744081413,0.8157223595,0.1404183728,"https://salsa.debian.org/a11y-team/flite","https://github.com/festvox/flite.git",1668.0555208333,9,16,0,21,106,0,0,106,1,"1",1.64,2 -"fmit",1.0288892251,2.9965682542,0.1345537728,"https://salsa.debian.org/debian/fmit","https://github.com/gillesdegottex/fmit.git",2966.0915162037,22,10,0,21,45,0,0,56,2,"2",1.3125,1.80357142857143 -"fntsample",-1.2332590184,-0.5969756101,-1.356176006,"https://salsa.debian.org/debian/fntsample","https://github.com/eugmes/fntsample.git",4121.0789467593,2,4,0,4,10,0,0,10,3,"3",1.66666666666667,2 -"master",0.5018954955,1.5987261482,0.0085779359,"https://salsa.debian.org/fonts-team/font-manager","https://github.com/FontManager/master",5185.326875,55,11,1,48,170,0,0,191,4,"4",1.16666666666667,1.89005235602094 -"Hack",0.3465705045,2.2081920487,-0.0730912243,"https://salsa.debian.org/fonts-team/fonts-hack","https://github.com/source-foundry/Hack",1976.7616666667,7,26,5,23,227,0,0,243,1,"1",1.78787878787879,1.93415637860082 -"amiri",0.0448942076,0.9201808842,-0.1302579721,"https://salsa.debian.org/fonts-team/fonts-hosny-amiri","https://github.com/alif-type/amiri.git",5474.3578935185,5,10,0,8,97,0,0,98,4,"4",1.66666666666667,1.98979591836735 -"inter",0.0129835005,2.785802699,-0.6565554603,"https://salsa.debian.org/fonts-team/fonts-inter","https://github.com/rsms/inter",2281.2912847222,23,7,3,20,124,0,0,141,1,"1",1.23333333333333,1.87943262411348 -"frogatto",0.2316946335,1.7654688811,-0.3927779946,"https://salsa.debian.org/games-team/frogatto","https://github.com/frogatto/frogatto.git",5646.0325115741,6,89,0,29,83,0,17,104,4,"4",1.93684210526316,1.79807692307692 -"Frozen-Flask",-1.5052476806,0.5681861838,-1.9677533136,"https://github.com/SimonSapin/Frozen-Flask/","https://github.com/SimonSapin/Frozen-Flask",4711.306712963,2,29,0,26,105,0,1,106,3,"3",1.93548387096774,1.99056603773585 -"fsvs",-0.0088293976,2.3566933183,-1.0467726594,"https://salsa.debian.org/debian/fsvs","https://github.com/phmarek/fsvs.git",2690.6840972222,8,4,0,3,6,0,0,7,1,"1",1.33333333333333,1.85714285714286 -"fswatch",0.0801114642,1.6766491485,-0.5710250772,"https://salsa.debian.org/debian/fswatch","https://github.com/emcrisostomo/fswatch.git",4816.5607060185,6,27,0,22,362,0,6,368,3,"3",1.81818181818182,1.98369565217391 -"ftgl",1.2143599406,2.1964355506,0.6199512905,"https://salsa.debian.org/ftgl-team/ftgl","https://github.com/frankheckenbach/ftgl",5371.3004976852,3,17,0,10,18,0,0,23,4,"4",1.85,1.78260869565217 -"funcoeszz",1.014177301,3.1202339314,0.1028457996,"https://salsa.debian.org/debian/funcoeszz","https://github.com//funcoeszz/funcoeszz",5372.2990972222,4,52,0,0,0,0,6,6,4,"4",1.92857142857143,1 -"fusioninventory-agent",0.4127421594,1.2756692416,0.0042753938,"https://salsa.debian.org/perl-team/modules/packages/fusioninventory-agent","https://github.com/fusioninventory/fusioninventory-agent.git",5660.8499537037,88,75,0,69,277,0,0,307,4,"4",1.4601226993865,1.90228013029316 -"fuzzylite",0.0236301475,2.058515685,-0.6491075451,"https://salsa.debian.org/debian/fuzzylite","https://github.com/fuzzylite/fuzzylite",3931.5160648148,3,20,0,8,30,0,0,30,3,"3",1.8695652173913,2 -"fuzzywuzzy",-0.4399858222,1.3206226327,-0.8570537668,"https://salsa.debian.org/python-team/packages/fuzzywuzzy","https://github.com/seatgeek/fuzzywuzzy",3716.0564236111,14,64,0,61,347,0,2,353,2,"2",1.82051282051282,1.98300283286119 -"fvwm2-debian",0.3091526029,0.4698895246,0.1811764904,"https://github.com/somiaj/fvwm2-debian","https://github.com/somiaj/fvwm2-debian",699.9356018519,1,3,0,1,0,0,0,1,1,"1",1.75,1 -"sight",-0.1731785778,1.2619602504,-0.8211865446,"https://salsa.debian.org/med-team/fw4spl","https://github.com/IRCAD/sight",5192.8487268519,18,189,0,40,13,0,0,45,4,"4",1.91304347826087,1.28888888888889 -"fwupdate",-0.0344756086,2.1966931571,-0.4710643437,"https://salsa.debian.org/efi-team/fwupdate","https://github.com/rhinstaller/fwupdate.git",2299.0056365741,21,5,0,15,40,0,3,49,1,"1",1.19230769230769,1.81632653061224 -"fzy",-0.3762088336,1.9399715065,-0.8640459444,"https://salsa.debian.org/debian/fzy","https://github.com/jhawthorn/fzy",2752.1003125,14,25,0,30,165,0,3,168,2,"2",1.64102564102564,1.98214285714286 -"g810-led",-0.8841874287,0.5790349373,-1.1503333071,"https://salsa.debian.org/debian/g810-led","https://github.com/MatMoul/g810-led.git",2361.9422453704,17,31,0,31,369,0,2,376,1,"1",1.64583333333333,1.9813829787234 -"monitor-core",1.9418594289,3.110187068,1.2272175248,"https://salsa.debian.org/debian/ganglia","https://github.com/ganglia/monitor-core.git",5029.4003703704,5,128,0,60,190,0,20,215,4,"4",1.96240601503759,1.88372093023256 -"ganglia-web",2.9867677001,5.9425493751,1.6513889403,"https://salsa.debian.org/debian/ganglia-web","https://github.com/ganglia/ganglia-web",3989.7465162037,9,91,0,54,144,0,10,160,3,"3",1.91,1.9 -"garglk",0.3494600276,1.5754786967,-0.2152021362,"https://salsa.debian.org/games-team/gargoyle-free","https://github.com/garglk/garglk.git",5517.4756134259,6,35,0,30,137,0,4,145,4,"4",1.85365853658537,1.9448275862069 -"gaupol",0.4507268429,1.4194389083,0.0001075777,"https://salsa.debian.org/python-team/packages/gaupol","https://github.com/otsaloma/gaupol",5574.4414699074,17,10,0,13,96,0,0,102,4,"4",1.37037037037037,1.94117647058824 -"geographiclib",-0.2708682617,0.4210044305,-0.5188380677,"https://salsa.debian.org/debian-gis-team/geographiclib","https://github.com/geographiclib/geographiclib.git",5589.1283333333,0,17,0,9,0,0,0,9,4,"4",2,1 -"geoipupdate",0.0025717488,1.6500054943,-0.358124043,"https://salsa.debian.org/debian/geoipupdate","https://github.com/maxmind/geoipupdate",3751.8112615741,25,42,0,34,57,0,0,77,2,"2",1.62686567164179,1.74025974025974 -"geolinks",-0.181262941,2.4550244029,-0.7445474906,"https://salsa.debian.org/debian-gis-team/geolinks","https://github.com/geopython/geolinks.git",3405.8642361111,2,3,0,4,8,0,0,8,2,"2",1.6,2 -"geophar",-0.941493032,-0.2177195536,-1.1312469677,"https://salsa.debian.org/georgesk/geophar","https://github.com/wxgeo/geophar",4439.4260185185,0,6,0,3,5,0,0,7,3,"3",2,1.71428571428571 -"geopy",-0.1987709641,1.3312828211,-0.5312977883,"https://salsa.debian.org/python-team/packages/geopy","https://github.com/geopy/geopy",5485.118125,94,49,3,101,381,0,0,395,4,"4",1.34265734265734,1.96455696202532 -"gerbv",0.7065741787,1.742115916,0.1740178886,"https://salsa.debian.org/electronics-team/gerbv","https://github.com/gerbv/gerbv.git",5724.3901851852,29,11,0,24,49,0,0,64,4,"4",1.275,1.765625 -"ghp-import",-0.4929741774,2.5133796067,-1.274122331,"https://salsa.debian.org/python-team/packages/ghp-import","https://github.com/c-w/ghp-import.git",4494.8705092593,15,11,0,21,78,0,0,84,3,"3",1.42307692307692,1.92857142857143 -"git-big-picture",0.3518387907,3.3166834133,-0.4853412989,"https://salsa.debian.org/python-team/packages/git-big-picture","https://github.com/git-big-picture/git-big-picture.git",5024.3069097222,14,10,0,14,46,0,0,48,4,"4",1.41666666666667,1.95833333333333 -"git-ftp",-0.1788027121,1.7435604018,-0.6973926208,"https://salsa.debian.org/debian/git-ftp","https://github.com/git-ftp/git-ftp",4532.203599537,24,92,3,82,432,0,0,479,3,"3",1.79310344827586,1.90187891440501 -"gitinspector",-0.5400481096,0.210511756,-0.7012239295,"https://salsa.debian.org/python-team/packages/gitinspector","https://github.com/ejwa/gitinspector",3089.9889236111,14,6,3,18,213,0,0,217,2,"2",1.3,1.9815668202765 -"gitsome",-1.5867602711,-1.1930128544,-1.6624023004,"https://salsa.debian.org/debian/gitsome","https://github.com/donnemartin/gitsome",1294.2226388889,14,16,0,27,199,0,0,199,1,"1",1.53333333333333,2 -"givaro",0.5117865646,1.6258650747,-0.0135088131,"https://salsa.debian.org/math-team/givaro","https://github.com/linbox-team/givaro",5710.7340740741,9,44,0,21,43,0,0,44,4,"4",1.83018867924528,1.97727272727273 -"lieer",-1.7520281461,0.654977795,-2.4063141302,"https://salsa.debian.org/debian/lieer","https://github.com/gauteh/lieer",2464.2436689815,23,14,0,29,147,0,7,154,1,"1",1.37837837837838,1.95454545454545 -"gmrender-resurrect",-0.6885555604,0.4388812357,-0.9886243591,"https://salsa.debian.org/debian/gmrender-resurrect","https://github.com/hzeller/gmrender-resurrect.git",3933.2407407407,9,14,0,17,244,0,41,286,3,"3",1.60869565217391,1.85314685314685 -"gnome-gmail",0.1152563841,1.2377514132,-0.3137068328,"https://github.com/davesteele/gnome-gmail/tree/debian","https://github.com/davesteele/gnome-gmail",5107.0565740741,6,30,0,8,52,0,0,53,4,"4",1.83333333333333,1.9811320754717 -"gnome-hwp-support",-0.1527039415,2.6330164164,-0.8636063871,"https://salsa.debian.org/l10n-korean-team/gnome-hwp-support","https://github.com/changwoo/gnome-hwp-support.git",4275.4146296296,1,2,0,1,2,0,0,2,3,"3",1.66666666666667,2 -"gnome-keysign",-0.6319731543,0.8678564413,-0.9085456046,"https://salsa.debian.org/debian/gnome-keysign","https://github.com/gnome-keysign/gnome-keysign",3520.8003356482,42,26,0,52,24,0,0,62,2,"2",1.38235294117647,1.38709677419355 -"gnome-mastermind",0.1896631142,2.1249915571,-0.4064733165,"https://salsa.debian.org/debian/gnome-mastermind","https://github.com/fargiolas/gnome-mastermind",5420.9395486111,1,6,0,3,2,0,0,3,4,"4",1.85714285714286,1.66666666666667 -"googler",-0.3686431402,0.6283580924,-0.5542725364,"https://salsa.debian.org/debian/googler","https://github.com/jarun/googler.git",4778.9107060185,15,26,0,29,68,0,6,94,3,"3",1.63414634146341,1.72340425531915 -"GPaste",-0.3060429164,-0.2513668941,-0.3230260451,"https://salsa.debian.org/debian/gpaste","https://github.com/Keruspe/GPaste",4709.6430092593,65,21,2,60,352,0,0,376,3,"3",1.24418604651163,1.93617021276596 -"gpick",0.3287244142,1.9268349477,-0.1661653459,"https://salsa.debian.org/elias/gpick","https://github.com/thezbyg/gpick.git",5237.0590625,5,6,0,8,64,0,1,67,4,"4",1.54545454545455,1.95522388059702 -"grabserial",-0.534268649,2.390246914,-1.2967244647,"https://salsa.debian.org/debian/grabserial","https://github.com/tbird20d/grabserial",3634.0012152778,11,19,0,17,53,0,1,55,2,"2",1.63333333333333,1.96363636363636 -"grantlee",0.8850917122,2.9819943474,0.1506454305,"https://salsa.debian.org/qt-kde-team/extras/grantlee","https://github.com/steveire/grantlee.git",4939.9756481482,29,11,0,23,19,0,1,37,3,"3",1.275,1.51351351351351 -"graphite",0.3733807726,1.1779395242,0.0796158429,"https://salsa.debian.org/libreoffice-team/graphite2","https://github.com/silnrsi/graphite.git",4797.7791319445,6,20,0,12,63,0,0,66,3,"3",1.76923076923077,1.95454545454545 -"gravit",0.6045580957,3.2029078171,-0.2991692425,"https://salsa.debian.org/debian-astro-team/gravit","https://github.com/gak/gravit",4467.9773263889,1,15,2,3,13,0,0,13,3,"3",1.9375,2 -"grcompiler",-0.2033731514,1.6514805751,-0.9604435457,"https://salsa.debian.org/fonts-team/grcompiler","https://github.com/silnrsi/grcompiler.git",4870.0000925926,3,20,0,10,14,0,0,15,3,"3",1.8695652173913,1.93333333333333 -"gsa",0.417412477,2.9619681562,-0.4656797598,"https://salsa.debian.org/pkg-security-team/greenbone-security-assistant","https://github.com/greenbone/gsa",5193.7357407407,22,54,0,37,36,0,0,62,4,"4",1.71052631578947,1.58064516129032 -"grepcidr-pkg-debian",-0.000512138,1.8231074226,-0.4693331824,"https://github.com/rfinnie/grepcidr-pkg-debian","https://github.com/rfinnie/grepcidr-pkg-debian",3175.8474652778,0,1,0,1,0,0,0,1,2,"2",2,1 -"grok",0.7555036124,3.2549577139,-0.2949948657,"https://salsa.debian.org/debian/grok","https://github.com/jordansissel/grok",2851.8223263889,0,12,0,5,47,0,0,47,2,"2",2,2 -"gromit-mpx",-0.1368392632,2.3961082606,-0.7236856316,"https://salsa.debian.org/debian/gromit-mpx","https://github.com/bk138/gromit-mpx.git",5287.5376388889,14,15,0,22,52,0,0,63,4,"4",1.51724137931034,1.82539682539683 -"grun",3.4314737452,6.9914396992,1.9512456029,"https://salsa.debian.org/debian/grun","https://github.com/lrgc/grun.git",1780.0517708333,1,4,0,2,2,0,0,3,1,"1",1.8,1.66666666666667 -"textfsm",-1.959276856,0.4998119958,-2.4671799826,"https://salsa.debian.org/python-team/packages/gtextfsm","https://github.com/google/textfsm.git",4331.1065625,11,7,0,12,114,0,11,125,3,"3",1.38888888888889,1.912 -"gtimelog",-0.3131503011,0.4195928542,-0.6469396999,"https://salsa.debian.org/python-team/packages/gtimelog","https://github.com/gtimelog/gtimelog",5699.091412037,18,41,2,31,102,0,0,108,4,"4",1.69491525423729,1.94444444444444 -"gtkhash",-0.0470549768,0.3813091669,-0.1959531443,"https://salsa.debian.org/debian/gtkhash","https://github.com/tristanheaven/gtkhash",4558.9808449074,79,10,0,62,43,0,0,96,3,"3",1.1123595505618,1.44791666666667 -"guessit",0.5092433942,2.4339696308,-0.2792039187,"https://salsa.debian.org/python-team/packages/guessit","https://github.com/guessit-io/guessit.git",2993.2388078704,14,29,0,17,232,0,0,242,2,"2",1.67441860465116,1.95867768595041 -"guidata",0.226943724,2.7660796551,-0.444547265,"https://salsa.debian.org/science-team/guidata","https://github.com/Codra-Ingenierie-Informatique/guidata",4839.0752893519,0,24,0,9,22,0,0,27,3,"3",2,1.81481481481481 -"guile-json",-0.447679014,2.3175980112,-1.1284049069,"https://salsa.debian.org/debian/guile-json","https://github.com/aconchillo/guile-json.git",3764.8305324074,3,17,0,14,43,0,0,45,2,"2",1.85,1.95555555555556 -"harminv",-0.2633327682,0.7959993879,-0.5621576388,"https://salsa.debian.org/alteholz/harminv","https://github.com/NanoComp/harminv",2906.4731712963,1,5,0,4,15,0,0,15,2,"2",1.83333333333333,2 -"harvid",0.172456355,1.3037883065,-0.1734116499,"https://salsa.debian.org/multimedia-team/harvid","https://github.com/x42/harvid.git",3621.9749189815,0,4,0,4,14,0,0,14,2,"2",2,2 -"hashcat",0.6568099259,2.9193273288,-0.0688683154,"https://salsa.debian.org/pkg-security-team/hashcat","https://github.com/hashcat/hashcat.git",2915.0251851852,48,153,0,135,297,0,0,392,2,"2",1.76119402985075,1.75765306122449 -"haveged",0.9608769092,1.929900484,0.4239904529,"https://salsa.debian.org/debian/haveged","https://github.com/jirka-h/haveged",1886.382650463,9,23,0,22,68,0,1,73,1,"1",1.71875,1.93150684931507 -"haxe-debian",-0.5201211998,0.2916566292,-0.8543651007,"https://github.com/HaxeFoundation/haxe-debian","https://github.com/HaxeFoundation/haxe-debian",5039.1597916667,3,5,0,5,4,0,0,7,4,"4",1.625,1.57142857142857 -"hcxdumptool",0.1119022392,3.6410156171,-0.7455348999,"https://salsa.debian.org/pkg-security-team/hcxdumptool","https://github.com/ZerBea/hcxdumptool",2117.0106134259,10,18,0,22,84,0,7,102,1,"1",1.64285714285714,1.82352941176471 -"hdapsd",0.6538996291,2.6942351149,-0.1231193096,"https://salsa.debian.org/debian/hdapsd","https://github.com/evgeni/hdapsd.git",2619.5010416667,2,5,0,5,12,0,0,13,1,"1",1.71428571428571,1.92307692307692 -"HDMI2USB-mode-switch",-0.1979989796,2.8942330744,-1.0013410785,"https://salsa.debian.org/debian/hdmi2usb-mode-switch","https://github.com/timvideos/HDMI2USB-mode-switch.git",1539.4512152778,3,11,0,8,15,0,0,15,1,"1",1.78571428571429,2 -"hesiod",1.3520798772,2.882041099,0.5698299795,"https://github.com/achernya/hesiod","https://github.com/achernya/hesiod",2444.8183564815,0,5,0,6,15,0,0,17,1,"1",2,1.88235294117647 -"hexchat",0.4113463635,1.0763225756,0.0766285755,"https://salsa.debian.org/debian/hexchat","https://github.com/hexchat/hexchat",4968.6586458333,146,71,1,160,5,0,0,162,3,"3",1.32718894009217,1.03086419753086 -"hg-git",0.321128458,1.270139629,-0.1895586953,"https://salsa.debian.org/python-team/packages/hg-git","https://github.com/schacon/hg-git.git",2615.4964467593,1,76,0,52,117,0,4,163,1,"1",1.98701298701299,1.71779141104294 -"hidapi",0.225542389,1.7475434274,-0.1119105457,"https://salsa.debian.org/debian/hidapi","https://github.com/libusb/hidapi.git",4972.5820717593,120,14,0,103,49,0,4,137,3,"3",1.1044776119403,1.35766423357664 -"hippomocks",-1.8899787337,1.9694566517,-3.0475420799,"https://salsa.debian.org/debian-iot-team/hippomocks","https://github.com/dascandy/hippomocks",3806.1184837963,0,35,0,21,73,0,1,77,3,"3",2,1.94805194805195 -"hitch",-0.5288912788,2.1847591306,-1.4438568394,"https://salsa.debian.org/debian/hitch","https://github.com/varnish/hitch",4466.179224537,30,59,0,59,215,0,20,260,3,"3",1.66292134831461,1.82692307692308 -"hol-light",0.6740208455,3.3227951452,-0.2913969773,"https://salsa.debian.org/ocaml-team/hol-light","https://github.com/jrh13/hol-light.git",2937.7842708333,2,18,0,10,39,0,0,39,2,"2",1.9,2 -"htmldoc",0.7571165722,1.6423946949,0.2768464827,"https://salsa.debian.org/haava/htmldoc","https://github.com/michaelrsweet/htmldoc.git",5679.7610416667,3,12,0,7,61,0,0,65,4,"4",1.8,1.93846153846154 -"htmlmin",0.3749839326,3.8009648796,-0.4061989629,"https://salsa.debian.org/python-team/packages/htmlmin","https://github.com/mankyd/htmlmin",1758.1454050926,0,22,0,16,60,0,0,60,1,"1",2,2 -"htpdate",-0.4445412636,1.6194045516,-0.91888023,"https://salsa.debian.org/debian/htpdate","https://github.com/twekkel/htpdate",706.8257407407,6,5,0,5,17,0,0,17,1,"1",1.45454545454545,2 -"hubicfuse",-0.6743910684,0.4155398958,-0.9708496832,"https://salsa.debian.org/debian/hubicfuse","https://github.com/TurboGit/hubicfuse",4598.8082291667,5,42,0,32,165,0,1,182,3,"3",1.8936170212766,1.90659340659341 -"hunspell-kk",0.1699792789,2.5686056687,-0.3539934531,"http://github.com/taem/hunspell-kk/tree/master","http://github.com/taem/hunspell-kk",1009.2540509259,0,1,0,0,0,0,0,0,1,"1",2,NA -"hw-probe",-0.2705391309,2.1366348662,-0.8036350878,"https://salsa.debian.org/debian/hw-probe","https://github.com/linuxhw/hw-probe",2812.8207638889,5,13,0,14,115,0,0,116,2,"2",1.72222222222222,1.99137931034483 -"hwdata",0.2497218136,0.8673309736,-0.0033926663,"https://salsa.debian.org/pino/hwdata","https://github.com/vcrhonek/hwdata.git",5761.1231481482,4,18,0,12,14,0,0,19,4,"4",1.81818181818182,1.73684210526316 -"hwinfo",1.0352583411,1.8703572076,0.5288235361,"https://salsa.debian.org/debian/hwinfo","https://github.com/openSUSE/hwinfo",5630.0100347222,11,25,0,19,74,0,0,77,4,"4",1.69444444444444,1.96103896103896 -"hwloc",0.034853164,0.3073992793,-0.0657896516,"https://salsa.debian.org/debian/hwloc","https://github.com/open-mpi/hwloc.git",5420.947349537,40,25,0,39,173,0,7,189,4,"4",1.38461538461538,1.91534391534392 -"hyperlink",0.844118141,3.90404712,0.0109391917,"https://salsa.debian.org/python-team/packages/hyperlink","https://github.com/python-hyper/hyperlink",1636.1480324074,8,24,0,21,47,0,0,49,1,"1",1.75,1.95918367346939 -"hyperscan",-0.1939906796,1.1323195527,-0.5069001368,"https://salsa.debian.org/debian/hyperscan","https://github.com/intel/hyperscan.git",2738.472962963,25,11,0,26,361,0,0,365,1,"1",1.30555555555556,1.98904109589041 -"ibus-libpinyin",0.0745339719,1.4965685521,-0.4552149234,"https://salsa.debian.org/debian/ibus-libpinyin","https://github.com/libpinyin/ibus-libpinyin",5637.8364236111,33,12,0,32,417,0,2,432,4,"4",1.26666666666667,1.96527777777778 -"icdiff",-0.1438152922,1.9369823287,-0.574052024,"https://salsa.debian.org/debian/icdiff","https://github.com/jeffkaufman/icdiff.git",4767.043599537,37,19,0,47,225,0,0,225,3,"3",1.33928571428571,2 -"icecream",0.3064642839,1.1295017582,-0.1573898799,"https://salsa.debian.org/qt-kde-team/extras/icecc","https://github.com/icecc/icecream",5413.4717939815,34,86,1,89,308,0,0,324,4,"4",1.71666666666667,1.95061728395062 -"ifcplusplus",-4.714020503,-1.546680493,-5.4430250217,"https://salsa.debian.org/science-team/ifcplusplus","https://github.com/ifcquery/ifcplusplus",3159.9779050926,3,29,0,17,119,0,1,120,2,"2",1.90625,1.99166666666667 -"ign-cmake",-0.0672943203,2.4451918145,-0.7211880559,"https://salsa.debian.org/science-team/ignition-cmake","https://github.com/ignitionrobotics/ign-cmake.git",2275.0046990741,21,38,0,34,52,0,0,56,1,"1",1.64406779661017,1.92857142857143 -"imexam",-0.5291204946,0.5693013221,-0.7719216675,"https://salsa.debian.org/debian-astro-team/imexam","https://github.com/spacetelescope/imexam",3485.9386226852,6,15,1,15,95,0,0,95,2,"2",1.71428571428571,2 -"imgp",-0.6548311047,1.5722939063,-1.0887948485,"https://salsa.debian.org/debian/imgp","https://github.com/jarun/imgp.git",2588.4491782407,7,6,0,8,44,0,2,47,1,"1",1.46153846153846,1.93617021276596 -"indicator-sensors",-0.5585654847,1.870631377,-1.1666724793,"https://salsa.debian.org/debian/indicator-sensors","https://github.com/alexmurray/indicator-sensors.git",4448.0518287037,1,8,0,6,33,0,1,36,3,"3",1.88888888888889,1.91666666666667 -"influxdb-python",0.5184399777,1.9994055882,-0.0609733668,"https://salsa.debian.org/python-team/packages/influxdb-python","https://github.com/influxdata/influxdb-python",3542.0853240741,64,90,1,124,596,0,0,618,2,"2",1.58441558441558,1.96440129449838 -"infnoise",-0.8043001603,2.0102163079,-1.7895799595,"https://salsa.debian.org/debian/infnoise","https://github.com/13-37-org/infnoise.git",3061.3638078704,9,32,0,27,33,0,1,52,2,"2",1.78048780487805,1.63461538461538 -"inkscape-open-symbols",0.1399161023,2.3946994301,-0.296432736,"https://salsa.debian.org/felix-guest/inkscape-open-symbols","https://github.com/Xaviju/inkscape-open-symbols",2971.3217939815,9,20,0,20,58,0,2,60,2,"2",1.68965517241379,1.96666666666667 -"compute-runtime",-0.3353488286,2.5434327002,-1.0380631241,"https://salsa.debian.org/opencl-team/intel-compute-runtime","https://github.com/intel/compute-runtime",2183.6453703704,160,87,0,159,86,0,0,220,1,"1",1.35222672064777,1.39090909090909 -"intelhex",-0.7181174872,1.5303194974,-1.1558028433,"https://salsa.debian.org/python-team/packages/intelhex","https://github.com/bialix/intelhex.git",2882.7775578704,4,21,0,12,61,0,0,63,2,"2",1.84,1.96825396825397 -"invesalius3",-0.365553699,0.412659255,-0.6585148784,"https://salsa.debian.org/med-team/invesalius","https://github.com/invesalius/invesalius3.git",5269.8872106482,20,33,0,28,105,0,9,123,4,"4",1.62264150943396,1.85365853658537 -"ioq3",0.2457529541,0.9626997446,-0.0891553792,"https://salsa.debian.org/games-team/ioquake3","https://github.com/ioquake/ioq3",5764.2156828704,42,58,0,65,301,0,0,310,4,"4",1.58,1.97096774193548 -"iortcw",-0.3609137722,1.7540737172,-0.8999552481,"https://salsa.debian.org/games-team/iortcw","https://github.com/iortcw/iortcw.git",3601.8735763889,5,20,0,13,129,0,0,131,2,"2",1.8,1.98473282442748 -"irssi",1.759294185,2.3625896628,1.3052149799,"https://salsa.debian.org/rhonda/irssi","https://github.com/irssi/irssi.git",5749.0144675926,36,142,0,114,230,0,5,301,4,"4",1.79775280898876,1.7641196013289 -"irssi-xmpp",0.6035691601,1.5557972582,0.0980337918,"https://salsa.debian.org/debian/irssi-plugin-xmpp","https://github.com/cdidier/irssi-xmpp",4266.8623958333,7,12,0,12,44,0,0,46,3,"3",1.63157894736842,1.95652173913043 -"irstlm",-0.5699998346,2.5734688359,-1.3621281388,"https://salsa.debian.org/science-team/irstlm","https://github.com/irstlm-team/irstlm.git",1268.8947337963,1,9,0,3,31,0,0,33,1,"1",1.9,1.93939393939394 -"islamic-menus",-0.8360403457,1.8927666646,-1.5208014105,"https://salsa.debian.org/islamic-team/islamic-menus","https://github.com/ojuba-org/islamic-menus",1447.6479050926,0,9,0,5,1,0,0,5,1,"1",2,1.2 -"ismrmrd",-0.4211375034,0.8719718551,-0.792919077,"https://salsa.debian.org/med-team/ismrmrd","https://github.com/ismrmrd/ismrmrd.git",4121.9187384259,23,44,0,33,72,0,1,77,3,"3",1.65671641791045,1.93506493506494 -"flags",1.0476074347,4.844542624,0.0451502018,"https://salsa.debian.org/cinnamon-team/iso-flags-svg","https://github.com/linuxmint/flags.git",563.1795833333,0,2,0,1,0,0,0,1,1,"1",2,1 -"isodate",0.7844107872,3.6859500169,-0.0654948523,"https://salsa.debian.org/python-team/packages/isodate","https://github.com/gweis/isodate",4815.1887152778,2,29,0,18,81,0,0,82,3,"3",1.93548387096774,1.98780487804878 -"ivtools",0.3988011669,1.0923186651,-0.0474693289,"https://salsa.debian.org/debian/ivtools","https://github.com/vectaport/ivtools",4623.9669328704,2,10,0,4,7,0,1,8,3,"3",1.83333333333333,1.875 -"include-what-you-use",0.2936470135,1.7756158607,-0.3256054834,"https://salsa.debian.org/pkg-llvm-team/iwyu","https://github.com/include-what-you-use/include-what-you-use",4692.8704050926,67,17,1,60,285,0,1,306,3,"3",1.20238095238095,1.93137254901961 -"jabberd2",-0.0340967947,0.9124576514,-0.5754415701,"https://salsa.debian.org/xmpp-team/jabberd2","https://github.com/jabberd2/jabberd2",3913.9184490741,17,25,0,26,119,0,5,129,3,"3",1.5952380952381,1.92248062015504 -"jansson",0.1407028183,0.668384438,-0.002779965,"https://salsa.debian.org/debian/jansson","https://github.com/akheron/jansson.git",5159.4155902778,29,84,0,80,127,0,3,188,4,"4",1.74336283185841,1.67553191489362 -"janus-gateway",-1.0533724499,0.8744335289,-1.6790293476,"https://salsa.debian.org/pkg-voip-team/janus","https://github.com/meetecho/janus-gateway",3591.8742708333,192,158,0,273,152,0,0,393,2,"2",1.45142857142857,1.38676844783715 -"jimtcl",0.0276014571,0.4709064501,-0.0432191953,"https://salsa.debian.org/debian/jimtcl","https://github.com/msteveb/jimtcl.git",5640.2291087963,31,13,0,32,66,0,2,79,4,"4",1.29545454545455,1.83544303797468 -"Jool",-2.1435730131,-0.0424378709,-2.6129119375,"https://github.com/NICMx/Jool","https://github.com/NICMx/Jool",4435.2104050926,8,57,3,37,162,0,6,172,3,"3",1.87692307692308,1.94186046511628 -"jopt-simple",-0.2557722008,1.1092730965,-0.5210596763,"https://salsa.debian.org/java-team/joptsimple","https://github.com/jopt-simple/jopt-simple.git",3771.2237962963,2,25,0,24,63,0,0,70,3,"3",1.92592592592593,1.9 -"jpy",-0.2335047706,1.5585712074,-0.6921580176,"https://salsa.debian.org/python-team/packages/jpy","https://github.com/jpy-consortium/jpy",3656.2358564815,16,28,3,25,27,0,0,44,2,"2",1.63636363636364,1.61363636363636 -"jpylyzer",-1.218476643,-0.4298985846,-1.4717139107,"https://salsa.debian.org/python-team/packages/jpylyzer","https://github.com/openpreserve/jpylyzer.git",3586.5846064815,2,28,0,16,31,0,2,37,2,"2",1.93333333333333,1.83783783783784 -"jq",0.9075077567,2.0772581347,0.3378546024,"https://salsa.debian.org/debian/jq","https://github.com/jqlang/jq",4164.9958796296,128,79,5,168,233,0,76,457,3,"3",1.38164251207729,1.50984682713348 -"jquery-i18n-properties",-0.8429862877,1.002530129,-1.1610901473,"https://salsa.debian.org/js-team/jquery-i18n-properties/","https://github.com/jquery-i18n-properties/jquery-i18n-properties.git",2244.4631597222,1,17,0,13,101,0,3,106,1,"1",1.94444444444444,1.95283018867925 -"JSJaC",-0.3265912384,2.0049639122,-1.1507866217,"https://salsa.debian.org/xmpp-team/jsjac","https://github.com/sstrigler/JSJaC.git",3682.6423958333,1,21,0,12,56,0,0,56,2,"2",1.95454545454545,2 -"json-c",0.7000238519,1.5684181486,0.2497560899,"https://salsa.debian.org/debian/json-c","https://github.com/json-c/json-c",5592.2949652778,18,150,0,130,463,0,13,500,4,"4",1.89285714285714,1.926 -"JSON-js",0.6358541009,3.1706913966,-0.0862776907,"https://salsa.debian.org/js-team/json-js","https://github.com/douglascrockford/JSON-js",4556.1964236111,1,4,0,2,14,0,0,15,3,"3",1.8,1.93333333333333 -"jsonlint",0.1283791193,1.6136347642,-0.1615279631,"https://salsa.debian.org/php-team/pear/jsonlint","https://github.com/Seldaek/jsonlint",4166.9388888889,11,28,0,34,62,0,0,62,3,"3",1.71794871794872,2 -"jsonpickle",-0.0589038511,1.6549477485,-0.6288474464,"https://salsa.debian.org/python-team/packages/jsonpickle","https://github.com/jsonpickle/jsonpickle",5737.1075462963,18,67,1,58,346,0,5,359,4,"4",1.78823529411765,1.96378830083565 -"jsusfx",-0.4818415459,1.4674471205,-0.8815812329,"https://salsa.debian.org/multimedia-team/pd/jsusfx","https://github.com/asb2m10/jsusfx.git",2697.3649768519,1,8,0,4,11,0,1,12,1,"1",1.88888888888889,1.91666666666667 -"keepassxc",0.077500136,0.7662262759,-0.1344432376,"https://salsa.debian.org/debian/keepassxc","https://github.com/keepassxreboot/keepassxc.git",4876.4075,354,94,0,352,4,0,6,360,3,"3",1.20982142857143,1.01111111111111 -"keras",0.5999454369,3.4232399441,-0.326875434,"https://salsa.debian.org/science-team/keras","https://github.com/keras-team/keras",3182.8412268519,1036,333,0,411,453,0,19,839,2,"2",1.24324324324324,1.53992848629321 -"klaus",-1.7963750896,-1.1425182339,-1.9244411722,"https://salsa.debian.org/jelmer/klaus","https://github.com/jonashaag/klaus",4576.8670717593,13,28,0,23,110,0,20,131,3,"3",1.68292682926829,1.83969465648855 -"klystrack",-0.5775196532,1.4334446874,-1.0926907229,"https://salsa.debian.org/multimedia-team/klystrack","https://github.com/kometbomb/klystrack",3882.7988194445,10,13,4,10,56,0,1,57,3,"3",1.56521739130435,1.98245614035088 -"pvr.dvbviewer",-0.2612255055,1.7338835217,-0.6785034929,"https://salsa.debian.org/multimedia-team/kodi-media-center/kodi-pvr-dvbviewer","https://github.com/kodi-pvr/pvr.dvbviewer.git",4026.1822916667,9,44,0,32,52,0,0,65,3,"3",1.83018867924528,1.8 -"pvr.hdhomerun",0.5662601343,3.972730551,-0.5089735041,"https://salsa.debian.org/multimedia-team/kodi-media-center/kodi-pvr-hdhomerun","https://github.com/kodi-pvr/pvr.hdhomerun.git",2925.247337963,9,28,0,19,39,0,0,42,2,"2",1.75675675675676,1.92857142857143 -"pvr.iptvsimple",0.0810763451,2.1337559183,-0.4122427721,"https://salsa.debian.org/multimedia-team/kodi-media-center/kodi-pvr-iptvsimple","https://github.com/kodi-pvr/pvr.iptvsimple.git",3805.7589236111,16,66,0,49,379,0,0,389,3,"3",1.80487804878049,1.97429305912596 -"pvr.njoy",-0.3919469766,1.5882858351,-0.7945898934,"https://salsa.debian.org/multimedia-team/kodi-media-center/kodi-pvr-njoy","https://github.com/kodi-pvr/pvr.njoy.git",4095.3650578704,9,40,0,28,19,0,0,33,3,"3",1.81632653061224,1.57575757575758 -"pvr.vdr.vnsi",-0.2767088162,1.1621317981,-0.6036919178,"https://salsa.debian.org/multimedia-team/kodi-media-center/kodi-pvr-vdr-vnsi","https://github.com/kodi-pvr/pvr.vdr.vnsi.git",4099.2902199074,12,57,0,44,64,0,0,80,3,"3",1.82608695652174,1.8 -"KWStyle",-0.5443680459,1.2886528987,-0.9977067271,"https://salsa.debian.org/eikel/kwstyle","https://github.com/Kitware/KWStyle",2816.187662037,4,44,0,30,32,0,0,49,2,"2",1.91666666666667,1.6530612244898 -"lablgtk",-0.5519683235,1.0254829683,-0.8566505829,"https://salsa.debian.org/ocaml-team/lablgtk3","https://github.com/garrigue/lablgtk.git",5750.3717824074,18,30,0,25,73,0,0,77,4,"4",1.625,1.94805194805195 -"lastpass-cli",-0.0433153425,1.3416622465,-0.5860041677,"https://salsa.debian.org/lamby/pkg-lastpass-cli","https://github.com/lastpass/lastpass-cli",3306.0089351852,30,62,0,67,0,0,1,68,2,"2",1.67391304347826,1 -"python-lazy-object-proxy",0.3043618863,2.7233170407,-0.1702005445,"https://salsa.debian.org/python-team/packages/lazy-object-proxy","https://github.com/ionelmc/python-lazy-object-proxy.git",3850.5882523148,8,10,0,14,87,0,0,89,3,"3",1.55555555555556,1.97752808988764 -"lcdproc",0.0416533252,0.5981870264,-0.2982890351,"https://salsa.debian.org/debian/lcdproc","https://github.com/lcdproc/lcdproc",1977.3798148148,39,20,0,41,113,0,0,115,1,"1",1.33898305084746,1.98260869565217 -"ldap-git-backup",-1.373786898,-0.3569713865,-1.6171841836,"https://github.com/elmar/ldap-git-backup","https://github.com/elmar/ldap-git-backup",3900.9497222222,1,9,0,6,10,0,0,10,3,"3",1.9,2 -"ldap2dns",0.4410660379,3.2730345751,-0.8182558109,"https://salsa.debian.org/debian/ldap2dns","https://github.com/bklang/ldap2dns",1032.2710185185,0,4,0,1,4,0,0,4,1,"1",2,2 -"ldapscripts",0.4789463026,1.4448695661,0.0155611927,"https://github.com/gerasiov/ldapscripts","https://github.com/gerasiov/ldapscripts",4203.2921643519,3,5,0,3,2,0,0,3,3,"3",1.625,1.66666666666667 -"pkg-ledgersmb",-1.9768906241,-1.2384100445,-2.32818406,"https://github.com/ledgersmb/pkg-ledgersmb","https://github.com/ledgersmb/pkg-ledgersmb",5388.1821643519,1,9,0,4,4,0,1,7,4,"4",1.9,1.57142857142857 -"ledmon",-0.0267359746,1.6972099329,-0.5787233435,"https://salsa.debian.org/debian/ledmon","https://github.com/intel/ledmon",4704.5067592593,35,24,0,32,75,0,0,79,3,"3",1.40677966101695,1.9493670886076 -"legit",-1.3724471459,-0.9914117218,-1.4783160816,"https://salsa.debian.org/python-team/packages/legit","https://github.com/frostming/legit",4465.0884027778,8,56,0,47,233,0,2,238,3,"3",1.875,1.97899159663866 -"mod_auth_openidc",0.2336891928,2.1536731239,-0.5343344056,"https://salsa.debian.org/debian/libapache2-mod-auth-openidc","https://github.com/zmartzone/mod_auth_openidc.git",3541.8657638889,12,50,0,46,138,0,41,214,2,"2",1.80645161290323,1.64485981308411 -"libappimage",-0.1632051649,2.0657738619,-0.6650493915,"https://salsa.debian.org/qt-kde-team/3rdparty/libappimage","https://github.com/AppImageCommunity/libappimage.git",1789.5842476852,9,6,0,11,54,0,0,54,1,"1",1.4,2 -"attean",-1.3143281259,1.0491513887,-1.7605023994,"https://salsa.debian.org/perl-team/modules/packages/libattean-perl","https://github.com/kasei/attean.git",3387.9902314815,2,10,0,9,20,0,0,20,2,"2",1.83333333333333,2 -"libcec",0.2382725094,0.9041078801,-0.0486730427,"https://salsa.debian.org/debian/libcec","https://github.com/Pulse-Eight/libcec.git",3960.8179282408,30,52,0,62,729,0,2,741,3,"3",1.63414634146341,1.98380566801619 -"cereal",-1.0094893182,-0.4350648989,-1.165390033,"https://salsa.debian.org/med-team/libcereal","https://github.com/USCiLab/cereal",3631.1027546296,36,60,3,68,151,0,4,201,2,"2",1.625,1.75124378109453 -"CGI--Application--Dispatch",0.204830766,4.1969078733,-0.9847022953,"https://salsa.debian.org/perl-team/modules/packages/libcgi-application-dispatch-perl","https://github.com/markstos/CGI--Application--Dispatch.git",1893.6213773148,0,9,0,8,9,0,0,9,1,"1",2,2 -"CGI-Application-Plugin-Session",-0.4119679947,2.4410793318,-1.1626629958,"https://salsa.debian.org/perl-team/modules/packages/libcgi-application-plugin-session-perl","https://github.com/frioux/CGI-Application-Plugin-Session",1734.1852083333,2,2,0,2,1,0,0,3,1,"1",1.5,1.33333333333333 -"libcgroup",0.8905633465,1.7409188519,0.3692553148,"https://salsa.debian.org/debian/libcgroup","https://github.com/libcgroup/libcgroup",5745.3289930556,43,20,2,31,36,0,0,52,4,"4",1.31746031746032,1.69230769230769 -"libdnet",0.6447638804,1.8645884536,0.1303098815,"https://salsa.debian.org/debian/libdumbnet","https://github.com/ofalk/libdnet",3068.4848032407,6,20,0,16,42,0,0,44,2,"2",1.76923076923077,1.95454545454545 -"libebur128",0.4008800859,2.5097823396,-0.0483144637,"https://salsa.debian.org/multimedia-team/libebur128","https://github.com/jiixyj/libebur128",3690.6439930556,1,22,0,19,70,0,0,71,2,"2",1.95652173913043,1.98591549295775 -"ejml",-1.6145518294,1.0936860376,-2.2108976925,"https://salsa.debian.org/java-team/libejml-java","https://github.com/lessthanoptimal/ejml",5141.1358564815,14,15,0,17,85,0,0,85,4,"4",1.51724137931034,2 -"p5-encode",0.0933708639,1.2559525686,-0.1937815459,"https://salsa.debian.org/perl-team/modules/packages/libencode-perl","https://github.com/dankogai/p5-encode.git",5752.78,4,51,0,42,88,0,0,90,4,"4",1.92727272727273,1.97777777777778 -"libepoxy",0.3100507455,1.1926379346,0.0363222284,"https://salsa.debian.org/xorg-team/lib/libepoxy","https://github.com/anholt/libepoxy.git",3236.6618981482,11,45,0,45,212,0,0,215,2,"2",1.80357142857143,1.98604651162791 -"liberasurecode",-0.4839675188,1.1970872377,-0.8694804348,"https://salsa.debian.org/openstack-team/libs/liberasurecode","https://github.com/openstack/liberasurecode.git",3370.5594560185,7,23,0,19,7,0,0,26,2,"2",1.76666666666667,1.26923076923077 -"perl-error.pm",1.2535323608,3.335171802,0.4397835194,"https://salsa.debian.org/perl-team/modules/packages/liberror-perl","https://github.com/shlomif/perl-error.pm.git",4521.3125694445,0,3,0,2,3,0,0,4,3,"3",2,1.75 -"libesedb",-0.0038540304,1.3424306865,-0.3777859111,"https://salsa.debian.org/pkg-security-team/libesedb","https://github.com/libyal/libesedb",2793.913912037,0,1,0,1,61,0,2,63,2,"2",2,1.96825396825397 -"libesmtp",0.2677621782,0.8388085609,-0.0156401267,"https://github.com/jbouse-debian/libesmtp","https://github.com/jbouse-debian/libesmtp",4730.7607986111,1,4,0,2,1,0,0,2,3,"3",1.8,1.5 -"libestr",0.2583326289,1.2734255517,0.0106705212,"https://salsa.debian.org/debian/libestr","https://github.com/rsyslog/libestr.git",2916.1839236111,6,7,0,9,8,0,0,13,2,"2",1.53846153846154,1.61538461538462 -"libevent",0.7674583301,1.6743727385,0.314106766,"https://salsa.debian.org/debian/libevent","https://github.com/libevent/libevent",5769.2016435185,214,125,1,240,0,0,6,246,4,"4",1.36873156342183,1 -"libgeotiff",0.3969402517,2.1076539482,-0.0842600623,"https://salsa.debian.org/debian-gis-team/libgeotiff","https://github.com/OSGeo/libgeotiff.git",5753.8535763889,6,17,0,21,54,0,0,58,4,"4",1.73913043478261,1.93103448275862 -"libglvnd",0.3742764654,1.2232824361,0.0505144955,"https://salsa.debian.org/xorg-team/lib/libglvnd.git","https://github.com/NVIDIA/libglvnd.git",3760.105162037,9,47,0,41,117,0,0,133,2,"2",1.83928571428571,1.8796992481203 -"libgroove",-0.5717771357,0.9386669616,-0.9657138035,"https://salsa.debian.org/multimedia-team/libgroove","https://github.com/andrewrk/libgroove",3739.9100810185,3,10,1,10,62,0,2,65,2,"2",1.76923076923077,1.95384615384615 -"hdf4",0.7482393831,1.3419798784,0.3704858112,"https://salsa.debian.org/debian-gis-team/hdf4","https://github.com/HDFGroup/hdf4.git",5770.0810416667,9,27,0,20,22,0,2,34,4,"4",1.75,1.64705882352941 -"libheif",0.7756133995,3.7562106714,0.0328408592,"https://salsa.debian.org/multimedia-team/libheif","https://github.com/strukturag/libheif.git",2185.1827314815,30,67,0,79,121,0,1,182,1,"1",1.69072164948454,1.66483516483516 -"hpptools",-2.8766583863,-0.6777605247,-3.3195064784,"https://salsa.debian.org/med-team/libhpptools","https://github.com/mateidavid/hpptools.git",498.7340625,0,2,0,2,3,0,0,3,1,"1",2,2 -"HTML-Clean",-0.1024783024,1.2552104643,-0.471169751,"https://salsa.debian.org/perl-team/modules/packages/libhtml-clean-perl","https://github.com/poizon/HTML-Clean.git",1155.8983796296,1,3,0,2,2,0,0,2,1,"1",1.75,2 -"p5-html-embedded-turtle",-2.1754143328,0.1122982625,-2.6152678827,"https://salsa.debian.org/perl-team/modules/packages/libhtml-embedded-turtle-perl","https://github.com/tobyink/p5-html-embedded-turtle",1183.7536805556,0,1,0,1,0,0,0,1,1,"1",2,1 -"html-formhandler-model-dbic",-1.4203781466,0.7927422874,-1.859585529,"https://salsa.debian.org/perl-team/modules/packages/libhtml-formhandler-model-dbic-perl","http://github.com/gshank/html-formhandler-model-dbic",1856.3547106482,2,11,0,0,0,0,0,0,1,"1",1.84615384615385,NA -"p5-html-html5-entities",-0.3934618041,1.0242081172,-0.6537250647,"https://salsa.debian.org/perl-team/modules/packages/libhtml-html5-entities-perl","https://github.com/tobyink/p5-html-html5-entities.git",1072.6158333333,0,1,0,1,1,0,0,2,1,"1",2,1.5 -"p5-html-html5-parser",0.8137592838,4.383181915,-0.3515590143,"https://salsa.debian.org/perl-team/modules/packages/libhtml-html5-parser-perl","https://github.com/tobyink/p5-html-html5-parser",4302.9721412037,1,7,0,5,9,0,0,10,3,"3",1.875,1.9 -"libhtp",0.266072694,2.5728754227,-0.5638059217,"https://salsa.debian.org/pkg-suricata-team/pkg-libhtp","https://github.com/OISF/libhtp",5122.0736226852,15,26,2,25,31,0,0,43,4,"4",1.63414634146341,1.72093023255814 -"isa-l",-0.6533940488,1.7011237676,-1.0694298788,"https://salsa.debian.org/openstack-team/third-party/libisal","https://github.com/01org/isa-l.git",2846.4837615741,29,18,0,38,96,0,3,119,2,"2",1.38297872340426,1.80672268907563 -"libjpeg-turbo",0.8208594826,1.6678864112,0.3714003986,"https://salsa.debian.org/debian/libjpeg-turbo/","https://github.com/libjpeg-turbo/libjpeg-turbo",5541.3943171296,44,10,2,41,501,0,0,509,4,"4",1.18518518518519,1.98428290766208 -"p5-JSON-WebToken",-0.1644580581,1.9565513103,-0.5873542729,"https://salsa.debian.org/perl-team/modules/packages/libjson-webtoken-perl","https://github.com/xaicron/p5-JSON-WebToken.git",993.7868981481,0,6,0,2,16,0,0,16,1,"1",2,2 -"p5-kavorka",-1.1158599676,1.8699475451,-1.8919945693,"https://salsa.debian.org/perl-team/modules/packages/libkavorka-perl","https://github.com/tobyink/p5-kavorka",2218.7228703704,0,8,0,5,29,0,0,29,1,"1",2,2 -"p5-latex-table",-0.7020862971,0.7997073577,-0.9848467916,"https://salsa.debian.org/perl-team/modules/packages/liblatex-table-perl","https://github.com/lima1/p5-latex-table.git",556.2399421296,0,2,0,1,0,0,0,1,1,"1",2,1 -"liblbfgs",-0.1459606149,2.0255666612,-0.6194709752,"https://salsa.debian.org/science-team/liblbfgs","https://github.com/chokkan/liblbfgs",5534.0610763889,8,10,0,13,32,0,0,32,4,"4",1.55555555555556,2 -"p5-lexical-underscore",-0.1208593875,2.7968625617,-0.887693709,"https://salsa.debian.org/perl-team/modules/packages/liblexical-underscore-perl","https://github.com/tobyink/p5-lexical-underscore",2933.2191203704,0,1,0,1,4,0,0,4,2,"2",2,2 -"liblognorm",0.9012585102,2.3010415095,0.3051975451,"https://salsa.debian.org/debian/liblognorm","https://github.com/rsyslog/liblognorm.git",4686.8326273148,7,31,0,23,111,0,0,111,3,"3",1.81578947368421,2 -"libmateweather",0.1284830495,0.843121277,-0.0753011191,"https://salsa.debian.org/debian-mate-team/libmateweather","https://github.com/mate-desktop/libmateweather.git",4345.3109837963,19,32,0,32,92,0,0,94,3,"3",1.62745098039216,1.97872340425532 -"libmaxminddb",0.5075375731,2.425458321,-0.014814615,"https://salsa.debian.org/debian/libmaxminddb","https://github.com/maxmind/libmaxminddb",3984.2393634259,21,43,0,49,64,0,0,98,3,"3",1.671875,1.6530612244898 -"method-signatures",-1.1413649114,1.1667964397,-1.6439970781,"https://salsa.debian.org/perl-team/modules/packages/libmethod-signatures-perl","https://github.com/evalEmpire/method-signatures.git",4206.6153935185,3,21,0,18,41,0,1,42,3,"3",1.875,1.97619047619048 -"miglayout",0.0140581375,1.0961315638,-0.2200314501,"https://salsa.debian.org/java-team/libmiglayout-java","https://github.com/mikaelgrev/miglayout",3114.6859375,4,24,0,17,57,0,0,59,2,"2",1.85714285714286,1.96610169491525 -"libminc",-0.2431199399,0.9558742118,-0.5877175902,"https://salsa.debian.org/med-team/libminc","https://github.com/BIC-MNI/libminc.git",5746.5411342593,3,34,0,18,29,0,0,33,4,"4",1.91891891891892,1.87878787878788 -"libmodbus",0.4081348938,2.0101967387,-0.0931762571,"https://salsa.debian.org/debian/libmodbus","https://github.com/stephane/libmodbus.git",5746.5321180556,58,15,0,55,615,0,25,649,4,"4",1.20547945205479,1.94761171032357 -"moosex-compiletime-traits",-1.5653963424,0.9933122892,-2.1997931366,"https://salsa.debian.org/perl-team/modules/packages/libmoosex-compiletime-traits-perl","https://github.com/nperez/moosex-compiletime-traits.git",0.0730787037,0,1,0,0,0,0,0,0,1,"1",2,NA -"MooseX-MultiInitArg",-1.070754038,1.0835902153,-1.5042988332,"https://salsa.debian.org/perl-team/modules/packages/libmoosex-multiinitarg-perl","https://github.com/frodwith/MooseX-MultiInitArg.git",0.0628703704,0,1,0,1,0,0,0,1,1,"1",2,1 -"p5-moosex-mungehas",-1.7054687669,0.6551084355,-2.1489172119,"https://salsa.debian.org/perl-team/modules/packages/libmoosex-mungehas-perl","https://github.com/tobyink/p5-moosex-mungehas",2044.5397800926,1,6,0,4,6,0,0,6,1,"1",1.85714285714286,2 -"MooseX-Runnable",-1.5770222755,1.133906618,-2.3498416952,"https://salsa.debian.org/perl-team/modules/packages/libmoosex-runnable-perl","https://github.com/moose/MooseX-Runnable",3541.9794097222,1,4,0,4,4,0,0,6,2,"2",1.8,1.66666666666667 -"p5-moosex-xsaccessor",-1.7969930844,0.6221995894,-2.237446435,"https://salsa.debian.org/perl-team/modules/packages/libmoosex-xsaccessor-perl","https://github.com/tobyink/p5-moosex-xsaccessor",3461.6608333333,0,1,0,1,1,0,0,2,2,"2",2,1.5 -"p5-moox-cmd",-1.7714724432,0.7389635101,-2.3287224021,"https://salsa.debian.org/perl-team/modules/packages/libmoox-cmd-perl","https://github.com/Getty/p5-moox-cmd",2141.9085532407,4,4,0,7,9,0,0,11,1,"1",1.5,1.81818181818182 -"p5-moox-struct",1.100399874,4.7268638235,0.0231138942,"https://salsa.debian.org/perl-team/modules/packages/libmoox-struct-perl","https://github.com/tobyink/p5-moox-struct",3679.9237037037,1,2,0,2,4,0,0,4,2,"2",1.66666666666667,2 -"MooX-Types-MooseLike",0.2188487287,2.4276236186,-0.2341829878,"https://salsa.debian.org/perl-team/modules/packages/libmoox-types-mooselike-perl","https://github.com/mateu/MooX-Types-MooseLike.git",1382.0588888889,0,16,0,12,20,0,0,21,1,"1",2,1.95238095238095 -"p5-MouseX-NativeTraits",0.451797092,3.5585079183,-0.2632252957,"https://salsa.debian.org/perl-team/modules/packages/libmousex-nativetraits-perl","https://github.com/gfx/p5-MouseX-NativeTraits.git",1010.1283101852,1,4,0,2,2,0,0,4,1,"1",1.8,1.5 -"p5-mousex-types",-0.9002059228,2.4281097906,-1.6194395424,"https://salsa.debian.org/perl-team/modules/packages/libmousex-types-perl","https://github.com/yappo/p5-mousex-types.git",984.7711226852,0,8,0,2,5,0,0,7,1,"1",2,1.71428571428571 -"libmpdclient",0.2085560362,1.356457434,-0.1176167234,"https://salsa.debian.org/mpd-team/libmpdclient","https://github.com/MusicPlayerDaemon/libmpdclient",5726.394375,18,26,0,31,41,0,0,60,4,"4",1.59090909090909,1.68333333333333 -"libofx",0.2034150256,0.6532722257,-0.0343613081,"https://salsa.debian.org/debian/libofx","https://github.com/libofx/libofx",5174.00625,8,16,0,16,48,0,0,49,4,"4",1.66666666666667,1.97959183673469 -"OpenHMD",0.1127945014,1.854847445,-0.28253551,"https://salsa.debian.org/debian/libopenhmd","https://github.com/OpenHMD/OpenHMD",3515.7873958333,18,41,1,36,258,0,18,277,2,"2",1.69491525423729,1.93140794223827 -"Pandoc-Elements",-1.2178305762,1.3066890827,-1.790496828,"https://salsa.debian.org/perl-team/modules/packages/libpandoc-elements-perl","https://github.com/nichtich/Pandoc-Elements.git",2600.5557175926,2,3,0,3,9,0,2,12,1,"1",1.6,1.75 -"Pandoc-Wrapper",-1.1913578813,0.8972995069,-1.7262399697,"https://salsa.debian.org/perl-team/modules/packages/libpandoc-wrapper-perl","https://github.com/nichtich/Pandoc-Wrapper.git",1879.2412037037,2,4,0,5,16,0,0,17,1,"1",1.66666666666667,1.94117647058824 -"params-callbackrequest",-1.3155087057,0.9970633758,-1.7603650909,"https://salsa.debian.org/perl-team/modules/packages/libparams-callbackrequest-perl","https://github.com/theory/params-callbackrequest.git",1199.2313657407,0,2,0,1,0,0,0,1,1,"1",2,1 -"Params-Util",0.5669557248,2.7095409025,0.0183304165,"https://salsa.debian.org/perl-team/modules/packages/libparams-util-perl","https://github.com/perl5-utils/Params-Util",4635.8917939815,2,6,0,2,5,0,0,5,3,"3",1.75,2 -"parse-cpan-packages",-1.3162623238,0.055729798,-1.5930972954,"https://salsa.debian.org/perl-team/modules/packages/libparse-cpan-packages-perl","https://github.com/wchristian/parse-cpan-packages",2213.1126273148,1,3,0,4,6,0,0,8,1,"1",1.75,1.75 -"Parse-Method-Signatures",-0.3098675421,2.1520892101,-0.7857930491,"https://salsa.debian.org/perl-team/modules/packages/libparse-method-signatures-perl","https://github.com/ashb/Parse-Method-Signatures.git",3028.8479166667,2,10,0,8,5,0,0,10,2,"2",1.83333333333333,1.5 -"perl-Parse-Netstat",-1.2901506305,0.9707747961,-1.7179336241,"https://salsa.debian.org/perl-team/modules/packages/libparse-netstat-perl","https://github.com/perlancar/perl-Parse-Netstat.git",4083.673275463,0,11,0,2,0,0,0,2,3,"3",2,1 -"Parse-RecDescent",-0.0286467306,0.2229895206,-0.1007582655,"https://salsa.debian.org/perl-team/modules/packages/libparse-recdescent-perl","https://github.com/jtbraun/Parse-RecDescent.git",2082.3553240741,1,5,0,2,7,0,0,7,1,"1",1.83333333333333,2 -"perl-pdf-report",-1.1407475711,-0.7317783117,-1.2346814292,"https://salsa.debian.org/perl-team/modules/packages/libpdf-report-perl","https://github.com/hashbangperl/perl-pdf-report.git",159.7184490741,0,1,0,1,2,0,0,2,1,"1",2,2 -"PDL-IO-Matlab",-1.8122896746,0.3558570995,-2.2370761422,"https://salsa.debian.org/perl-team/modules/packages/libpdl-io-matlab-perl","https://github.com/jlapeyre/PDL-IO-Matlab.git",3358.4244907408,1,2,0,2,4,0,0,4,2,"2",1.66666666666667,2 -"perl-Perinci-Sub-Normalize",-2.9327731106,-0.9162267093,-3.3201523401,"https://salsa.debian.org/perl-team/modules/packages/libperinci-sub-normalize-perl","https://github.com/perlancar/perl-Perinci-Sub-Normalize.git",3147.5333564815,0,11,0,2,0,0,0,2,2,"2",2,1 -"p5-perlx-assert",-1.0193446605,1.5425032533,-1.8362395319,"https://salsa.debian.org/perl-team/modules/packages/libperlx-assert-perl","https://github.com/tobyink/p5-perlx-assert",1111.6440162037,0,1,0,1,1,0,0,1,1,"1",2,2 -"p5-perlx-define",-2.1678337344,0.0459215725,-2.6131874891,"https://salsa.debian.org/perl-team/modules/packages/libperlx-define-perl","https://github.com/tobyink/p5-perlx-define",0.0109259259,0,1,0,1,1,0,0,1,1,"1",2,2 -"libplist",0.2890151668,0.7751330361,0.068106781,"https://salsa.debian.org/imobiledevice-team/libplist","https://github.com/libimobiledevice/libplist.git",5614.0678125,41,20,0,42,98,0,0,127,4,"4",1.32786885245902,1.77165354330709 -"libpng",0.1677990695,0.4257948453,0.0473446327,"https://salsa.debian.org/debian/libpng1.6","https://github.com/glennrp/libpng",5354.1097106482,66,26,0,71,29,0,1,92,4,"4",1.28260869565217,1.31521739130435 -"quazip",0.2146838323,0.9284953049,-0.0650262981,"https://salsa.debian.org/debian/libquazip","https://github.com/stachenov/quazip.git",5295.4944097222,19,25,0,36,147,0,0,150,4,"4",1.56818181818182,1.98 -"rabbitmq-c",0.5937450624,2.3238703606,-0.0094513193,"https://salsa.debian.org/debian/librabbitmq","https://github.com/alanxz/rabbitmq-c.git",5294.5360185185,63,49,0,77,513,0,0,520,4,"4",1.4375,1.98653846153846 -"librarian-puppet",-1.4485786469,-0.1256063685,-1.863254572,"https://salsa.debian.org/ruby-team/librarian-puppet","https://github.com/voxpupuli/librarian-puppet.git",4114.1364930556,12,65,0,51,102,0,0,135,3,"3",1.84415584415584,1.75555555555556 -"p5-rdf-trinex-functions",-0.3154319143,2.3378879966,-0.9704018341,"https://salsa.debian.org/perl-team/modules/packages/librdf-trinex-functions-perl","https://github.com/tobyink/p5-rdf-trinex-functions",833.4788657407,0,1,0,1,0,0,0,1,1,"1",2,1 -"p5-rdf-vcard",-1.1506651259,1.2441236911,-1.5912534228,"https://salsa.debian.org/perl-team/modules/packages/librdf-vcard-perl","https://github.com/tobyink/p5-rdf-vcard",1350.944537037,0,1,0,1,3,0,0,3,1,"1",2,2 -"re-engine-RE2",0.0664274847,1.5519335001,-0.198667675,"https://salsa.debian.org/perl-team/modules/packages/libre-engine-re2-perl","https://github.com/dgl/re-engine-RE2.git",4711.6157638889,4,2,0,5,11,0,0,11,3,"3",1.33333333333333,2 -"Regexp-Assemble",0.1956519681,1.1975556345,-0.0657051088,"https://salsa.debian.org/perl-team/modules/packages/libregexp-assemble-perl","https://github.com/ronsavage/Regexp-Assemble.git",3022.0175347222,1,7,0,6,10,0,0,10,2,"2",1.875,2 -"Regexp--Common",0.425402964,2.6846898207,-0.0434398169,"https://salsa.debian.org/perl-team/modules/packages/libregexp-common-perl","https://github.com/Abigail/Regexp--Common.git",2712.1816087963,4,1,0,3,10,0,0,12,1,"1",1.2,1.83333333333333 -"libregf",0.4815110403,3.4273810655,-0.3192521911,"https://salsa.debian.org/pkg-security-team/libregf","https://github.com/libyal/libregf",3351.514375,0,1,0,1,10,0,2,12,2,"2",2,1.83333333333333 -"librelp",0.3314612484,2.0471916806,-0.1848777948,"https://salsa.debian.org/debian/librelp","https://github.com/rsyslog/librelp",5591.5436921296,9,32,1,25,70,0,0,74,4,"4",1.78048780487805,1.94594594594595 -"libreswan",-0.4685289799,0.1790588169,-0.7335988012,"https://salsa.debian.org/debian/libreswan","https://github.com/libreswan/libreswan.git",5780.1473263889,145,62,0,96,291,0,0,336,4,"4",1.29951690821256,1.86607142857143 -"rose",-0.5901790776,0.7613087197,-0.8838877593,"https://salsa.debian.org/perl-team/modules/packages/librose-db-object-perl","https://github.com/siracusa/rose.git",5666.5254166667,1,13,0,5,15,0,1,16,4,"4",1.92857142857143,1.9375 -"librsync",1.0536449912,2.2531278593,0.4172888316,"https://salsa.debian.org/wrar/librsync","https://github.com/librsync/librsync",3224.9778472222,6,27,0,28,97,0,0,99,2,"2",1.81818181818182,1.97979797979798 -"libsamplerate",1.1293768908,2.270076752,0.5189548422,"https://salsa.debian.org/multimedia-team/libsamplerate","https://github.com/libsndfile/libsamplerate",5747.2226851852,38,5,1,34,55,0,0,67,4,"4",1.11627906976744,1.82089552238806 -"libsass-python",-0.2696522517,0.8271709552,-0.6027229138,"https://salsa.debian.org/debian/libsass-python","https://github.com/dahlia/libsass-python.git",4268.9750925926,7,93,0,77,129,0,0,180,3,"3",1.93,1.71666666666667 -"libseccomp",0.1381369347,0.416274215,0.0228352343,"https://salsa.debian.org/debian/libseccomp","https://github.com/seccomp/libseccomp",4323.2139467593,71,4,2,57,206,0,1,215,3,"3",1.05333333333333,1.95813953488372 -"libserial",-1.1010178283,1.6867209629,-1.6981926712,"https://salsa.debian.org/debian/libserial","https://github.com/crayzeewulf/libserial.git",5587.6811226852,3,17,0,12,68,0,2,71,4,"4",1.85,1.95774647887324 -"libsigcplusplus",1.039682316,2.0456143837,0.5117249183,"https://salsa.debian.org/gnome-team/libsigcplusplus","https://github.com/libsigcplusplus/libsigcplusplus.git",5770.9372800926,22,19,0,30,50,0,0,65,4,"4",1.46341463414634,1.76923076923077 -"smali",0.051369828,1.8568435409,-0.3306485602,"https://salsa.debian.org/android-tools-team/libsmali-java","https://github.com/JesusFreke/smali",4709.8444212963,28,24,0,34,365,0,10,381,3,"3",1.46153846153846,1.95800524934383 -"libsoundio",0.7102350676,3.6650448533,-0.2050801471,"https://salsa.debian.org/debian-hamradio-team/libsoundio","https://github.com/andrewrk/libsoundio.git",3080.119837963,16,23,0,26,120,0,4,127,2,"2",1.58974358974359,1.94488188976378 -"libspiro",0.131579132,1.3992780483,-0.1906866674,"https://salsa.debian.org/fonts-team/libspiro","https://github.com/fontforge/libspiro.git",4925.1799537037,1,10,0,7,21,0,0,21,3,"3",1.90909090909091,2 -"spreadsheet-parseexcel",0.0390044504,0.8094712372,-0.1827268471,"https://salsa.debian.org/perl-team/modules/packages/libspreadsheet-parseexcel-perl","https://github.com/runrig/spreadsheet-parseexcel.git",1902.0376851852,1,6,0,6,33,0,0,36,1,"1",1.85714285714286,1.91666666666667 -"spreadsheet-writeexcel",-0.0847103732,0.3100125622,-0.1871342632,"https://salsa.debian.org/perl-team/modules/packages/libspreadsheet-writeexcel-perl","https://github.com/jmcnamara/spreadsheet-writeexcel",5025.7453819445,1,5,0,5,0,0,1,6,4,"4",1.83333333333333,1 -"libssh2",0.4762440748,1.2465942901,0.1442247779,"https://salsa.debian.org/debian/libssh2","https://github.com/libssh2/libssh2",5758.7769328704,166,33,1,147,60,0,1,189,4,"4",1.16582914572864,1.31746031746032 -"libStatGen",-0.975335451,0.4820429389,-1.3209080132,"https://salsa.debian.org/med-team/libstatgen","https://github.com/statgen/libStatGen",3791.9891319445,4,17,0,10,34,0,0,36,3,"3",1.80952380952381,1.94444444444444 -"statistics--basic",-0.339509548,1.3960758717,-0.6303620815,"https://salsa.debian.org/perl-team/modules/packages/libstatistics-basic-perl","https://github.com/jettero/statistics--basic",2331.8967939815,1,4,0,2,4,0,0,5,1,"1",1.8,1.8 -"stb",0.0260953725,0.614834907,-0.1332118971,"https://salsa.debian.org/yangfl-guest/stb","https://github.com/nothings/stb",3489.7656944445,45,185,0,183,533,0,0,592,2,"2",1.80434782608696,1.90033783783784 -"p5-String-Diff",-1.3455951871,1.0906833724,-1.8998963909,"https://salsa.debian.org/perl-team/modules/packages/libstring-diff-perl","https://github.com/yappo/p5-String-Diff.git",2495.2807060185,0,3,0,2,16,0,0,16,1,"1",2,2 -"string-mkpasswd",-0.4901797022,1.4058339509,-0.8573438246,"https://salsa.debian.org/perl-team/modules/packages/libstring-mkpasswd-perl","https://github.com/sirhc/string-mkpasswd.git",1997.6768055556,0,4,0,2,7,0,0,7,1,"1",2,2 -"Switch",1.122027291,3.2876087875,0.2909942207,"https://salsa.debian.org/perl-team/modules/packages/libswitch-perl","https://github.com/chorny/Switch.git",4065.2442592593,3,4,0,4,3,0,0,6,3,"3",1.57142857142857,1.5 -"Sys-Filesystem",-1.1120417075,0.3703683235,-1.5493480129,"https://salsa.debian.org/perl-team/modules/packages/libsys-filesystem-perl","https://github.com/rehsack/Sys-Filesystem",4021.0829050926,2,3,0,2,3,0,0,3,3,"3",1.6,2 -"CPAN-Sys-Info-Base",-1.1657354635,0.2469375973,-1.4547896136,"https://salsa.debian.org/perl-team/modules/packages/libsys-info-base-perl","https://github.com/burak/CPAN-Sys-Info-Base.git",4472.8146643519,0,2,0,1,2,0,0,2,3,"3",2,2 -"tabixpp",-0.5609418279,1.5681864899,-0.9903141087,"https://salsa.debian.org/med-team/libtabixpp","https://github.com/ekg/tabixpp.git",4263.7660069445,1,12,0,9,27,0,0,27,3,"3",1.92307692307692,2 -"libteam",0.3146115396,1.3119743537,0.0101461881,"https://salsa.debian.org/debian/libteam","https://github.com/jpirko/libteam",4358.8268634259,40,5,0,31,78,0,3,102,3,"3",1.11111111111111,1.76470588235294 -"TermReadKey",0.6441757313,1.6725134495,0.1757431378,"https://salsa.debian.org/perl-team/modules/packages/libterm-readkey-perl","https://github.com/jonathanstowe/TermReadKey.git",4734.9570717593,8,17,0,18,40,0,0,42,3,"3",1.68,1.95238095238095 -"Term-Table",-0.9505327372,1.4037764096,-1.390637121,"https://salsa.debian.org/perl-team/modules/packages/libterm-table-perl","https://github.com/exodist/Term-Table.git",2498.9135185185,1,5,0,5,16,0,0,16,1,"1",1.83333333333333,2 -"Test-Harness",-1.5063742807,-0.2541479391,-1.8715013961,"https://salsa.debian.org/perl-team/modules/packages/libtest-harness-perl","https://github.com/Perl-Toolchain-Gang/Test-Harness.git",5734.1103356482,27,47,0,51,97,0,2,113,4,"4",1.63513513513514,1.85840707964602 -"URI",0.1589529919,0.4832194601,0.0298109637,"https://salsa.debian.org/perl-team/modules/packages/liburi-perl","https://github.com/libwww-perl/URI.git",5620.9042939815,27,14,0,37,89,0,1,98,4,"4",1.34146341463415,1.90816326530612 -"libusbmuxd",0.7289206284,2.7086807014,0.1072945241,"https://salsa.debian.org/imobiledevice-team/libusbmuxd","https://github.com/libimobiledevice/libusbmuxd.git",3636.013275463,9,9,0,14,171,0,0,173,2,"2",1.5,1.98843930635838 -"libvslvm",0.4972132182,3.5752748687,-0.3065187033,"https://salsa.debian.org/pkg-security-team/libvslvm","https://github.com/libyal/libvslvm",3338.937025463,0,1,0,1,10,0,2,12,2,"2",2,1.83333333333333 -"p5-web-id",-1.7090564746,0.8941936847,-2.3119612886,"https://salsa.debian.org/perl-team/modules/packages/libweb-id-perl","https://github.com/tobyink/p5-web-id",743.3495023148,0,1,0,1,1,0,0,1,1,"1",2,2 -"libwfut",-0.3722932827,1.182465359,-1.0373316516,"https://salsa.debian.org/games-team/libwfut","https://github.com/worldforge/libwfut",5568.6978240741,0,9,0,6,3,0,0,6,4,"4",2,1.5 -"libwmf",1.6375319104,2.6900330531,0.986051197,"https://salsa.debian.org/yangfl-guest/libwmf","https://github.com/caolanm/libwmf",1783.8275231482,5,6,0,8,12,0,0,14,1,"1",1.54545454545455,1.85714285714286 -"perl-wfa",-1.3338913453,0.3424607166,-1.6281493484,"https://salsa.debian.org/perl-team/modules/packages/libwww-facebook-api-perl","https://github.com/unobe/perl-wfa.git",3078.4910185185,2,7,0,4,7,0,0,8,2,"2",1.77777777777778,1.875 -"p5-www-finger",-1.969235679,0.3956899207,-2.5687445665,"https://salsa.debian.org/perl-team/modules/packages/libwww-finger-perl","https://github.com/tobyink/p5-www-finger",1316.1418171296,0,1,0,1,0,0,0,1,1,"1",2,1 -"www-google-calculator-perl",-1.995767031,-0.963482599,-2.1565335627,"https://salsa.debian.org/perl-team/modules/packages/libwww-google-calculator-perl","https://github.com/typester/www-google-calculator-perl.git",8.9802893519,0,2,0,1,1,0,0,2,1,"1",2,1.5 -"libx86emu",0.2882621713,2.1510294765,-0.1187700994,"https://salsa.debian.org/debian/libx86emu","https://github.com/wfeldt/libx86emu",5028.2515972222,1,8,0,5,16,0,1,17,4,"4",1.88888888888889,1.94117647058824 -"libxcrypt",0.6294336301,1.8917972899,0.1100717419,"https://salsa.debian.org/md/libxcrypt","https://github.com/besser82/libxcrypt.git",2976.0054050926,9,14,0,21,95,0,0,97,2,"2",1.60869565217391,1.97938144329897 -"libxmlb",0.6508495345,3.3286264453,-0.0130638591,"https://salsa.debian.org/efi-team/libxmlb","https://github.com/hughsie/libxmlb.git",1900.0449074074,20,6,0,18,36,0,0,36,1,"1",1.23076923076923,2 -"libxsmm",-0.2346624326,4.5583780245,-1.7957714951,"https://salsa.debian.org/science-team/libxsmm","https://github.com/libxsmm/libxsmm",2814.5005324074,23,91,3,47,120,0,3,130,2,"2",1.79824561403509,1.92307692307692 -"xstream",0.3400487245,1.4508992999,-0.0600865184,"https://salsa.debian.org/java-team/libxstream-java","https://github.com/x-stream/xstream.git",5706.9961921296,29,7,0,35,375,0,0,383,4,"4",1.19444444444444,1.97911227154047 -"light",0.5032985546,2.4196884631,-0.3115474994,"https://salsa.debian.org/debian/light","https://github.com/haikarainen/light.git",3160.1600115741,4,28,0,25,51,0,0,66,2,"2",1.875,1.77272727272727 -"light-locker",2.0302690876,3.664096529,1.142878255,"https://salsa.debian.org/xfce-extras-team/light-locker","https://github.com/the-cavalry/light-locker",4227.1496643519,82,214,2,128,275,0,0,390,3,"3",1.72297297297297,1.7051282051282 -"lightdm",2.2443975037,2.9446010571,1.7397776964,"https://salsa.debian.org/xfce-extras-team/lightdm","https://github.com/canonical/lightdm.git",4834.5447222222,52,64,0,73,415,0,0,449,3,"3",1.55172413793103,1.92427616926503 -"linux-minidisc",-0.9631872604,1.8387133413,-1.6378120208,"https://github.com/glaubitz/linux-minidisc","https://github.com/glaubitz/linux-minidisc",4847.712349537,36,17,0,20,3,0,0,23,3,"3",1.32075471698113,1.1304347826087 -"linux_logo",3.6168427209,4.8502382947,2.8124057325,"https://salsa.debian.org/debian/linuxlogo","https://github.com/deater/linux_logo.git",3761.5540393519,1,11,0,8,26,0,0,26,2,"2",1.91666666666667,2 -"LiTL",-1.9126650133,-1.5671586884,-1.990034954,"https://salsa.debian.org/debian/litl","https://github.com/trahay/LiTL.git",3099.0093171296,0,7,0,3,1,0,0,3,2,"2",2,1.33333333333333 -"lksctp-tools",0.0452198518,0.3695750173,-0.0618537574,"https://salsa.debian.org/debian/lksctp-tools","https://github.com/sctp/lksctp-tools",5515.8208912037,27,6,1,22,37,0,1,51,4,"4",1.18181818181818,1.72549019607843 -"llgal",-0.3872692626,0.4151216759,-0.6843175914,"https://github.com/bgoglin/llgal","https://github.com/bgoglin/llgal",4534.9444212963,2,4,0,1,11,0,0,11,3,"3",1.66666666666667,2 -"lltag",0.046755981,1.4904215665,-0.4505269549,"https://github.com/bgoglin/lltag","https://github.com/bgoglin/lltag",4379.0269328704,3,3,0,2,9,0,0,9,3,"3",1.5,2 -"lmodern",0.1884866384,0.5510456421,0.0188158223,"https://github.com/debian-tex/lmodern","https://github.com/debian-tex/lmodern",5129.2031828704,1,7,0,2,1,0,0,3,4,"4",1.875,1.33333333333333 -"lnav",0.5353667256,1.9342081999,-0.0323395042,"https://salsa.debian.org/carnil/lnav","https://github.com/tstack/lnav",5194.1560648148,17,59,0,51,384,0,4,404,4,"4",1.77631578947368,1.95049504950495 -"logging-log4cxx",0.4346363558,1.6002502027,-0.0917843487,"https://salsa.debian.org/debian/log4cxx","https://github.com/apache/logging-log4cxx.git",3632.7022222222,22,27,0,28,7,0,0,31,2,"2",1.55102040816327,1.2258064516129 -"logbook",-0.4896324695,1.3303979826,-1.0513067414,"https://salsa.debian.org/debian/logbook","https://github.com/getlogbook/logbook.git",4893.8917824074,11,77,0,65,189,0,0,192,3,"3",1.875,1.984375 -"logging_tree",-1.6414264559,0.7777898237,-2.2813478865,"https://salsa.debian.org/debian/python-logging-tree","https://github.com/brandon-rhodes/logging_tree.git",3349.1260532407,5,7,0,10,25,0,0,25,2,"2",1.58333333333333,2 -"redis-lua",-0.3995562839,2.3401321656,-1.0679040964,"https://salsa.debian.org/lua-team/lua-redis","https://github.com/nrk/redis-lua",2064.0116898148,2,10,0,8,80,0,0,80,1,"1",1.83333333333333,2 -"lxctl",1.456465586,5.0051312044,0.180488606,"https://salsa.debian.org/debian/lxctl","https://github.com/lxctl/lxctl",2540.4811342593,0,29,1,12,21,0,5,28,1,"1",2,1.75 -"lxde-icon-theme",0.3420036946,2.5520871,-0.0935522829,"https://salsa.debian.org/lxde-team/lxde-icon-theme","https://github.com/lxde/lxde-icon-theme",1739.474375,0,4,0,3,0,0,0,3,1,"1",2,1 -"lxhotkey",1.1410291912,4.8144910554,0.0876782474,"https://salsa.debian.org/lxde-team/lxhotkey","https://github.com/lxde/lxhotkey.git",2759.3632291667,8,4,0,8,27,0,0,32,2,"2",1.33333333333333,1.84375 -"lxinput",0.7555106667,3.0338681034,0.062981082,"https://salsa.debian.org/lxde-team/lxinput","https://github.com/lxde/lxinput.git",5254.8770717593,78,26,0,55,0,0,0,55,4,"4",1.25,1 -"lxqt-globalkeys",0.2347991986,1.8204555607,-0.1421664419,"https://salsa.debian.org/lxqt-team/lxqt-globalkeys","https://github.com/lxqt/lxqt-globalkeys.git",4146.0372916667,56,46,0,78,0,0,0,78,3,"3",1.45098039215686,1 -"lxqt-openssh-askpass",0.2639701586,2.0558849821,-0.1403263445,"https://salsa.debian.org/lxqt-team/lxqt-openssh-askpass","https://github.com/lxqt/lxqt-openssh-askpass.git",4154.121712963,34,30,0,50,29,0,0,59,3,"3",1.46875,1.49152542372881 -"lz4",0.2140600439,0.6954425453,0.0384684269,"https://salsa.debian.org/debian/lz4","https://github.com/lz4/lz4",3549.3137037037,30,172,0,147,393,0,5,456,2,"2",1.85148514851485,1.86184210526316 -"mako",0.9607195824,2.3152903989,0.3300125847,"https://salsa.debian.org/python-team/packages/mako","https://github.com/sqlalchemy/mako",5744.8817476852,23,45,7,53,64,0,6,98,4,"4",1.66176470588235,1.6530612244898 -"variant",0.159782488,3.7315023577,-0.6830233266,"https://salsa.debian.org/debian-gis-team/mapbox-variant/","https://github.com/mapbox/variant.git",2484.9211689815,4,25,0,18,52,0,1,55,1,"1",1.86206896551724,1.94545454545455 -"mapcache",-0.6849497052,1.4775793478,-1.119704947,"https://salsa.debian.org/debian-gis-team/mapcache","https://github.com/mapserver/mapcache.git",4429.8413773148,24,38,0,33,160,0,2,163,3,"3",1.61290322580645,1.98159509202454 -"mate-common",0.2236781765,1.5441453615,-0.2936941102,"https://salsa.debian.org/debian-mate-team/mate-common","https://github.com/mate-desktop/mate-common.git",4289.5348032407,4,19,0,14,26,0,0,28,3,"3",1.82608695652174,1.92857142857143 -"mate-control-center",0.442807422,1.1267913622,0.085872745,"https://salsa.debian.org/debian-mate-team/mate-control-center","https://github.com/mate-desktop/mate-control-center.git",4382.2688194445,31,51,0,48,319,0,0,321,3,"3",1.6219512195122,1.99376947040498 -"mate-desktop",1.4429678874,2.800379976,0.7048624548,"https://salsa.debian.org/debian-mate-team/mate-desktop","https://github.com/mate-desktop/mate-desktop.git",4339.3214814815,30,45,0,44,57,0,0,90,3,"3",1.6,1.63333333333333 -"dock-applet",0.3881982435,2.2401761238,-0.1688322569,"https://salsa.debian.org/debian-mate-team/mate-dock-applet","https://github.com/robint99/dock-applet.git",2711.5333680556,9,12,0,13,168,0,0,169,1,"1",1.57142857142857,1.99408284023669 -"mate-icon-theme",0.4087889597,2.4988457726,-0.055212655,"https://salsa.debian.org/debian-mate-team/mate-icon-theme","https://github.com/mate-desktop/mate-icon-theme.git",3997.7458217593,7,25,0,19,36,0,0,38,3,"3",1.78125,1.94736842105263 -"mate-icon-theme-faenza",0.5142431191,2.3829279771,-0.0287099151,"https://salsa.debian.org/debian-mate-team/mate-icon-theme-faenza","https://github.com/mate-desktop/mate-icon-theme-faenza.git",2081.9641898148,2,15,0,10,19,0,0,20,1,"1",1.88235294117647,1.95 -"mate-netbook",-0.1990739498,0.92545311,-0.5547977915,"https://salsa.debian.org/debian-mate-team/mate-netbook","https://github.com/mate-desktop/mate-netbook.git",4033.4643981482,4,20,0,14,35,0,0,37,3,"3",1.83333333333333,1.94594594594595 -"mate-notification-daemon",0.294431484,1.2443680719,-0.0375475363,"https://salsa.debian.org/debian-mate-team/mate-notification-daemon","https://github.com/mate-desktop/mate-notification-daemon.git",4376.8075462963,19,34,0,34,136,0,0,140,3,"3",1.64150943396226,1.97142857142857 -"mate-polkit",0.0844204987,0.7139928108,-0.078912062,"https://salsa.debian.org/debian-mate-team/mate-polkit","https://github.com/mate-desktop/mate-polkit.git",4293.1045717593,9,23,0,18,42,0,0,47,3,"3",1.71875,1.8936170212766 -"mate-settings-daemon",0.1815646983,0.7203109893,-0.0328315734,"https://salsa.debian.org/debian-mate-team/mate-settings-daemon","https://github.com/mate-desktop/mate-settings-daemon.git",4342.2338425926,28,45,0,46,189,0,0,200,3,"3",1.61643835616438,1.945 -"selinux",-1.9181882041,-0.1416609992,-2.339014847,"https://salsa.debian.org/selinux-team/mcstrans","https://github.com/SELinuxProject/selinux.git",5593.8026157407,179,30,0,124,83,0,12,182,4,"4",1.14354066985646,1.45604395604396 -"mdbtools",0.6161871039,1.1807658317,0.2302864182,"https://salsa.debian.org/debian/mdbtools","https://github.com/mdbtools/mdbtools",4863.4037152778,30,60,0,60,195,0,0,220,3,"3",1.66666666666667,1.88636363636364 -"mdk4",-0.0590321422,2.244566977,-0.6808566672,"https://salsa.debian.org/pkg-security-team/mdk4","https://github.com/aircrack-ng/mdk4",1545.4045949074,4,9,0,11,96,0,0,97,1,"1",1.69230769230769,1.98969072164948 -"metapixel",1.7970234478,4.4178259899,0.5633223634,"https://salsa.debian.org/debian/metapixel","https://github.com/schani/metapixel.git",3264.7618171296,2,6,0,4,25,0,0,25,2,"2",1.75,2 -"metastore",-0.4597261727,0.6466323956,-0.8107792072,"https://salsa.debian.org/rfrancoise/metastore","https://github.com/przemoc/metastore",5431.9336689815,7,2,1,8,30,0,2,33,4,"4",1.22222222222222,1.90909090909091 -"meteo-qt",0.8698899777,3.6161721459,0.0040074202,"https://salsa.debian.org/lxqt-team/meteo-qt","https://github.com/dglent/meteo-qt.git",3275.9305092593,3,17,0,16,53,0,0,53,2,"2",1.85,2 -"Mew",-0.487761537,-0.3514010061,-0.554001036,"https://salsa.debian.org/debian/mew","https://github.com/kazu-yamamoto/Mew",5007.0253703704,7,24,0,25,45,0,0,46,4,"4",1.7741935483871,1.97826086956522 -"Mew",-0.8388830323,-0.1260459264,-1.0270915103,"https://salsa.debian.org/debian/mew-beta","https://github.com/kazu-yamamoto/Mew",5007.0253703704,7,24,0,25,45,0,0,46,4,"4",1.7741935483871,1.97826086956522 -"mg",0.8626842283,2.0640170714,0.2148718944,"https://salsa.debian.org/debian/mg","https://github.com/hboetes/mg.git",2838.9768518519,3,9,0,3,25,0,0,25,2,"2",1.75,2 -"mhc",-0.8884000458,-0.3595274014,-1.157500378,"https://salsa.debian.org/debian/mhc","https://github.com/yoshinari-nomura/mhc",4808.1619907407,0,12,0,8,12,0,0,12,3,"3",2,2 -"mhwaveedit",-0.0845847669,0.9517864727,-0.4200690155,"https://salsa.debian.org/multimedia-team/mhwaveedit","https://github.com/magnush/mhwaveedit",4171.9324305556,3,7,0,6,15,0,0,16,3,"3",1.7,1.9375 -"micro-httpd",-0.3300074474,1.1160734611,-0.9308283084,"https://github.com/sudipm-mukherjee/micro-httpd.git","https://github.com/sudipm-mukherjee/micro-httpd.git",4120.3943287037,0,4,0,1,1,0,0,2,3,"3",2,1.5 -"MilkyTracker",0.2927952476,1.359126964,-0.1661437741,"https://salsa.debian.org/multimedia-team/milkytracker","https://github.com/milkytracker/MilkyTracker",5764.1453472222,35,32,1,44,68,0,5,92,4,"4",1.47761194029851,1.73913043478261 -"miller",-0.6485962999,1.145337313,-1.0224618063,"https://salsa.debian.org/debian/miller","https://github.com/johnkerl/miller.git",3146.11875,32,28,0,52,128,0,1,155,2,"2",1.46666666666667,1.8258064516129 -"mimetic",-1.0569767141,-0.8952643698,-1.0963723389,"https://git.toastfreeware.priv.at/debian/mimetic.git","https://github.com/tat/mimetic.git",2612.777962963,3,10,0,8,26,0,0,26,1,"1",1.76923076923077,2 -"Minder",-0.4197168251,2.1005562235,-0.9632919414,"https://salsa.debian.org/yangfl-guest/Minder","https://github.com/phase1geo/Minder.git",2148.0431712963,20,27,0,36,96,0,1,112,1,"1",1.57446808510638,1.85714285714286 -"minimodem",-0.3250415773,2.1360118932,-0.8562976169,"https://github.com/kamalmostafa/minimodem","https://github.com/kamalmostafa/minimodem",3742.1687037037,10,6,0,12,71,0,0,76,2,"2",1.375,1.93421052631579 -"mininet",-0.586251107,1.2693023429,-1.2259353746,"https://salsa.debian.org/debian/mininet","https://github.com/mininet/mininet",5029.9877777778,22,77,1,61,58,0,97,202,4,"4",1.77777777777778,1.28712871287129 -"mootools-core",0.7471893128,2.8560605859,0.0458469775,"https://salsa.debian.org/js-team/mootools","https://github.com/mootools/mootools-core.git",2900.1052662037,27,88,0,63,54,0,136,231,2,"2",1.76521739130435,1.23376623376623 -"mopidy-internetarchive",-0.2187337791,2.3088703355,-0.8028100126,"https://salsa.debian.org/mopidy-team/mopidy-internetarchive","https://github.com/tkem/mopidy-internetarchive",2991.6193171296,0,3,1,2,13,0,0,13,2,"2",2,2 -"mopidy-mpris",-0.2110446145,2.461940178,-1.1114345149,"https://salsa.debian.org/mopidy-team/mopidy-mpris","https://github.com/mopidy/mopidy-mpris.git",3543.9779050926,2,7,0,6,34,0,0,35,2,"2",1.77777777777778,1.97142857142857 -"mopidy-podcast",-0.2941570726,1.7690171184,-0.7388669271,"https://salsa.debian.org/mopidy-team/mopidy-podcast","https://github.com/tkem/mopidy-podcast.git",2983.3689236111,2,1,0,3,30,0,0,30,2,"2",1.33333333333333,2 -"mopidy-podcast-itunes",-0.2467767179,2.4591937682,-0.834541946,"https://salsa.debian.org/mopidy-team/mopidy-podcast-itunes","https://github.com/tkem/mopidy-podcast-itunes",2949.6816087963,0,2,0,1,9,0,0,9,2,"2",2,2 -"mopidy-scrobbler",-0.2517299962,2.1335156702,-1.0325443783,"https://salsa.debian.org/mopidy-team/mopidy-scrobbler","https://github.com/mopidy/mopidy-scrobbler.git",3546.3970023148,0,2,0,1,49,0,0,49,2,"2",2,2 -"mopidy-somafm",-0.2746325835,2.1609819918,-0.859324666,"https://salsa.debian.org/mopidy-team/mopidy-somafm","https://github.com/AlexandrePTJ/mopidy-somafm",2714.300787037,0,6,2,4,27,0,0,27,1,"1",2,2 -"mopidy-soundcloud",-0.2546570011,2.1558962885,-0.9457836601,"https://salsa.debian.org/mopidy-team/mopidy-soundcloud","https://github.com/mopidy/mopidy-soundcloud",3733.2794212963,4,17,2,16,160,0,0,161,2,"2",1.80952380952381,1.99378881987578 -"mopidy-tunein",-0.3236002892,2.6224531521,-1.0905202326,"https://salsa.debian.org/mopidy-team/mopidy-tunein","https://github.com/kingosticks/mopidy-tunein",2521.2538657407,2,14,1,8,41,0,0,41,1,"1",1.875,2 -"mp3fs",0.9163678404,4.5727174058,-0.2047299256,"https://salsa.debian.org/multimedia-team/mp3fs","https://github.com/khenriks/mp3fs.git",5444.4987847222,4,13,0,8,77,0,1,80,4,"4",1.76470588235294,1.9625 -"mpDris2",-0.9856715769,-0.7754968336,-1.0277106449,"https://salsa.debian.org/debian/mpdris2","https://github.com/eonpatapon/mpDris2.git",4512.1038657407,12,20,0,28,118,0,0,119,3,"3",1.625,1.99159663865546 -"mpv",0.5363042562,0.8628802276,0.3101358986,"https://salsa.debian.org/multimedia-team/mpv","https://github.com/mpv-player/mpv",5787.7142361111,512,145,0,277,26,0,383,675,4,"4",1.220700152207,1.03851851851852 -"mrboom-libretro",-0.241313948,1.6810544874,-0.7335121433,"https://salsa.debian.org/games-team/mrboom","https://github.com/Javanaise/mrboom-libretro",2489.0620833333,22,22,0,31,43,0,0,54,1,"1",1.5,1.7962962962963 -"msktutil",-0.1662803901,1.2423651932,-0.5841886377,"https://salsa.debian.org/debian/msktutil","https://github.com/msktutil/msktutil",4695.5949305556,8,21,2,11,34,0,1,38,3,"3",1.72413793103448,1.89473684210526 -"mtr",2.0179049728,2.8158196867,1.452557991,"https://salsa.debian.org/debian/mtr","https://github.com/traviscross/mtr",3917.0060648148,16,90,0,75,432,0,0,433,3,"3",1.84905660377358,1.99769053117783 -"mupen64plus-ui-console",0.7264116732,3.6995007165,-0.1670734867,"https://salsa.debian.org/games-team/mupen64plus-ui-console","https://github.com/mupen64plus/mupen64plus-ui-console.git",4990.6788773148,5,31,0,19,34,0,0,39,4,"4",1.86111111111111,1.87179487179487 -"mupen64plus-video-glide64mk2",0.1293389165,2.4637475631,-0.3196538821,"https://salsa.debian.org/games-team/mupen64plus-video-glide64mk2","https://github.com/mupen64plus/mupen64plus-video-glide64mk2.git",4126.6609027778,7,35,0,24,59,0,0,64,3,"3",1.83333333333333,1.921875 -"mupen64plus-video-rice",0.1071841352,2.1766235067,-0.3149398833,"https://salsa.debian.org/games-team/mupen64plus-video-rice","https://github.com/mupen64plus/mupen64plus-video-rice.git",4977.9831481482,5,34,0,21,49,0,0,56,3,"3",1.87179487179487,1.875 -"muse",0.3513323565,0.8924420388,0.0076925385,"https://salsa.debian.org/multimedia-team/muse","https://github.com/muse-sequencer/muse.git",5773.0492476852,5,55,0,31,49,0,5,76,4,"4",1.91666666666667,1.64473684210526 -"python-musicbrainz-ngs",0.5076678121,2.1969185222,-0.005881406,"https://salsa.debian.org/python-team/packages/musicbrainzngs","https://github.com/alastair/python-musicbrainz-ngs",3992.7430092593,1,28,3,24,83,0,3,88,3,"3",1.96551724137931,1.94318181818182 -"mypaint",0.3480815429,1.0170198092,-0.0287146792,"https://salsa.debian.org/python-team/packages/mypaint","https://github.com/mypaint/mypaint",5559.7677199074,333,53,2,235,44,0,30,291,4,"4",1.13730569948187,1.15120274914089 -"mysecureshell",-0.4842069771,1.8606131049,-0.9637054818,"https://github.com/mysecureshell/mysecureshell","https://github.com/mysecureshell/mysecureshell",2575.5671990741,3,14,1,9,102,0,0,104,1,"1",1.82352941176471,1.98076923076923 -"MySQLTuner-perl",1.4500845033,4.4623073775,0.3464758377,"https://salsa.debian.org/debian/mysqltuner","https://github.com/major/MySQLTuner-perl",4651.9533217593,46,119,0,115,371,0,0,407,3,"3",1.72121212121212,1.91154791154791 -"n2n",0.1542450391,2.8427672865,-0.655319557,"https://github.com/leggewie-DM/n2n","https://github.com/leggewie-DM/n2n",3071.9561111111,2,3,0,3,2,0,0,5,2,"2",1.6,1.4 -"nabi",-1.1181697355,0.3411872046,-1.5057188398,"https://salsa.debian.org/l10n-korean-team/nabi","https://github.com/libhangul/nabi.git",5305.1766782407,0,3,0,1,5,0,1,6,4,"4",2,1.83333333333333 -"nadoka",-4.0224516234,-0.7310921121,-5.1260106864,"https://salsa.debian.org/ruby-team/nadoka","https://github.com/nadoka/nadoka",4550.0664351852,0,9,0,8,6,0,4,13,3,"3",2,1.46153846153846 -"nagvis",0.2016649842,1.2173315085,-0.3600392025,"https://salsa.debian.org/nagios-team/nagvis","https://github.com/NagVis/nagvis",5779.6260648148,42,38,0,37,263,0,0,268,4,"4",1.475,1.98134328358209 -"ndppd",-0.5295407302,1.6070155277,-1.0766996059,"https://salsa.debian.org/debian/ndppd","https://github.com/DanielAdolfsson/ndppd",4471.5943171296,7,15,1,11,75,0,0,77,3,"3",1.68181818181818,1.97402597402597 -"netcdf-cxx4",-0.359140508,1.3957561161,-0.7913195086,"https://salsa.debian.org/debian-gis-team/netcdf-cxx","https://github.com/Unidata/netcdf-cxx4.git",4438.9411805556,3,28,0,22,99,0,0,100,3,"3",1.90322580645161,1.99 -"netcdf-fortran",-0.1482258041,0.751301518,-0.2962965499,"https://salsa.debian.org/debian/netcdf-fortran","https://github.com/Unidata/netcdf-fortran.git",4488.0650115741,7,39,0,30,150,0,0,153,3,"3",1.84782608695652,1.98039215686275 -"netdiscover",0.2541652433,1.9765761262,-0.2111939526,"https://salsa.debian.org/debian/netdiscover","https://github.com/netdiscover-scanner/netdiscover",5323.4166087963,1,5,0,3,24,0,0,24,4,"4",1.83333333333333,2 -"netplan",0.0413337826,1.5404784729,-0.3486539272,"https://salsa.debian.org/debian/netplan.io","https://github.com/canonical/netplan/commits/master",5185.326875,55,11,0,0,0,0,0,0,4,"4",1.16666666666667,NA -"debian",0.1730522588,2.4986742151,-0.2783909483,"https://github.com/nm-l2tp/debian.git","https://github.com/nm-l2tp/debian.git",2347.114224537,1,1,0,2,0,0,0,2,1,"1",1.5,1 -"NetworkManager-ssh",-0.0086320792,1.1414433729,-0.2761809158,"https://salsa.debian.org/lhw-guest/network-manager-ssh","https://github.com/danfruehauf/NetworkManager-ssh",3197.1808449074,4,7,0,12,101,0,1,103,2,"2",1.63636363636364,1.98058252427184 -"nixnote2",-0.3647270032,0.4002965512,-0.4904591503,"https://salsa.debian.org/debian/nixnote2","https://github.com/robert7/nixnote2",4104.4428587963,11,48,0,37,124,0,4,152,3,"3",1.8135593220339,1.81578947368421 -"nmrpflash",-3.9117966743,-1.8322545897,-4.343551647,"https://salsa.debian.org/debian/nmrpflash","https://github.com/jclehner/nmrpflash",2833.1074768519,10,8,0,14,32,0,0,45,2,"2",1.44444444444444,1.71111111111111 -"babel-plugin-add-module-exports",-1.4169325387,1.5441837408,-2.1700991878,"https://salsa.debian.org/js-team/node-babel-plugin-add-module-exports","https://github.com/59naga/babel-plugin-add-module-exports",2579.5546180556,2,7,0,4,98,0,0,98,1,"1",1.77777777777778,2 -"base64url",-1.8861246737,0.890181623,-2.5677734916,"https://salsa.debian.org/js-team/node-base64url","https://github.com/brianloveswords/base64url.git",3614.4876388889,6,11,0,12,83,0,0,83,2,"2",1.64705882352941,2 -"node-bindings",-0.3124286212,2.605717497,-1.0137570127,"https://salsa.debian.org/js-team/node-bindings","https://github.com/TooTallNate/node-bindings",2587.1395949074,4,8,0,8,5,0,0,12,1,"1",1.66666666666667,1.41666666666667 -"bluebird",0.0584203533,1.0937802889,-0.1343492494,"https://salsa.debian.org/js-team/node-bluebird","https://github.com/petkaantonov/bluebird.git",3418.3106597222,121,152,0,212,654,0,64,848,2,"2",1.55677655677656,1.77122641509434 -"clean-css",0.1880139003,2.7123268564,-0.4696783378,"https://salsa.debian.org/js-team/node-clean-css","https://github.com/GoalSmashers/clean-css.git",4686.8824537037,63,58,0,89,14,0,9,111,3,"3",1.47933884297521,1.12612612612613 -"co",0.4601096377,2.8630730353,-0.1003269721,"https://salsa.debian.org/js-team/node-co","https://github.com/tj/co",1229.0172106482,17,46,0,49,211,0,49,264,1,"1",1.73015873015873,1.79924242424242 -"code",-4.7551646559,-1.4632937686,-5.4545700188,"https://salsa.debian.org/js-team/node-code","https://github.com/hapijs/code.git",3316.1678125,19,23,0,28,93,0,0,93,2,"2",1.54761904761905,2 -"coffeeify",-1.4017605239,1.4637076784,-2.2159952345,"https://salsa.debian.org/js-team/node-coffeeify","https://github.com/jnordberg/coffeeify.git",1705.9137731482,1,13,0,10,64,0,0,69,1,"1",1.92857142857143,1.92753623188406 -"colormin",-3.5089164725,-0.6840024754,-4.2685005942,"https://salsa.debian.org/js-team/node-colormin","https://github.com/ben-eb/colormin",2228.6048148148,0,6,0,2,15,0,0,15,1,"1",2,2 -"combine-source-map",-2.1067627582,1.451088997,-3.1431542202,"https://salsa.debian.org/js-team/node-combine-source-map","https://github.com/thlorenz/combine-source-map.git",1465.4289583333,4,5,0,8,33,0,0,33,1,"1",1.55555555555556,2 -"concat-stream",0.3435827993,2.8106720089,-0.124130821,"https://salsa.debian.org/js-team/node-concat-stream","https://github.com/maxogden/concat-stream.git",2331.5214583333,5,21,0,18,3,0,0,20,1,"1",1.80769230769231,1.15 -"constants-browserify",-0.11940227,2.8343540596,-0.9198546616,"https://salsa.debian.org/js-team/node-constants-browserify","https://github.com/juliangruber/constants-browserify",3669.6149189815,0,3,0,1,5,0,0,5,2,"2",2,2 -"content-disposition",-0.1498091429,2.3260602113,-0.8520258644,"https://salsa.debian.org/js-team/node-content-disposition","https://github.com/jshttp/content-disposition.git",2639.7443518519,6,2,0,6,32,0,0,32,1,"1",1.25,2 -"convert-source-map",0.0871772545,2.7765163193,-0.5756792774,"https://salsa.debian.org/js-team/node-convert-source-map","https://github.com/thlorenz/convert-source-map",3505.4009953704,16,11,0,22,67,0,0,67,2,"2",1.40740740740741,2 -"node-cookie-signature",0.0990081923,2.8247812735,-0.6845514149,"https://salsa.debian.org/js-team/node-cookie-signature","https://github.com/visionmedia/node-cookie-signature.git",3831.3145486111,2,13,0,7,47,0,0,48,3,"3",1.86666666666667,1.97916666666667 -"core-js",-0.0701104518,1.8860340205,-0.4290715682,"https://salsa.debian.org/js-team/node-core-js","https://github.com/zloirock/core-js.git",3801.3871990741,67,73,0,121,289,0,0,376,3,"3",1.52142857142857,1.7686170212766 -"d3-dsv",-0.6792934342,2.1613351331,-1.3775271458,"https://salsa.debian.org/js-team/node-d3-dsv","https://github.com/d3/d3-dsv",3863.8892013889,14,6,0,17,65,0,0,65,3,"3",1.3,2 -"node-dateformat",-0.01865954,1.6506546912,-0.4323251957,"https://salsa.debian.org/js-team/node-dateformat","https://github.com/felixge/node-dateformat",3995.8592476852,8,37,0,33,231,0,3,235,3,"3",1.82222222222222,1.98297872340426 -"execa",0.7079961346,3.9551483175,-0.0722137493,"https://salsa.debian.org/js-team/node-execa","https://github.com/sindresorhus/execa",2926.6958680556,49,7,0,53,128,0,0,157,2,"2",1.125,1.81528662420382 -"node-expat",-0.4080781453,2.3530029048,-1.5150203534,"https://salsa.debian.org/js-team/node-expat","https://github.com/astro/node-expat",4931.3002893519,7,34,0,29,341,0,1,344,3,"3",1.82926829268293,1.99127906976744 -"node-formidable",-1.0478352411,1.3329643424,-1.6311123883,"https://salsa.debian.org/js-team/node-formidable","https://github.com/felixge/node-formidable.git",4861.6687384259,45,72,0,80,292,0,0,334,3,"3",1.61538461538462,1.87425149700599 -"fuzzaldrin-plus",-0.9739589777,1.136573322,-1.4594019089,"https://salsa.debian.org/js-team/node-fuzzaldrin-plus","https://github.com/jeancroy/fuzzaldrin-plus",751.1080902778,2,6,0,3,29,0,0,29,1,"1",1.75,2 -"grunt-babel",-2.3567896079,-0.2595823007,-2.786480601,"https://salsa.debian.org/js-team/node-grunt-babel","https://github.com/babel/grunt-babel.git",3011.4746296296,8,12,0,13,152,0,0,152,2,"2",1.6,2 -"grunt-cli",1.2110710947,4.4921332971,4.42152270994788e-05,"https://salsa.debian.org/js-team/node-grunt-cli","https://github.com/gruntjs/grunt-cli.git",3126.2931944445,8,16,0,20,171,0,0,171,2,"2",1.66666666666667,2 -"gulp-babel",-1.6753037226,0.7240298055,-2.2929274971,"https://salsa.debian.org/js-team/node-gulp-babel","https://github.com/babel/gulp-babel.git",3018.4431018519,10,21,0,25,301,0,0,304,2,"2",1.67741935483871,1.99013157894737 -"gulp-flatten",-2.894365887,-0.8111009229,-3.321955765,"https://salsa.debian.org/js-team/node-gulp-flatten","https://github.com/armed/gulp-flatten",3247.6037152778,2,7,0,6,17,0,1,18,2,"2",1.77777777777778,1.94444444444444 -"gulp-load-plugins",-1.2725888367,2.2883154102,-2.2151032496,"https://salsa.debian.org/js-team/node-gulp-load-plugins","https://github.com/jackfranklin/gulp-load-plugins",3321.8455787037,10,29,0,26,138,0,0,138,2,"2",1.74358974358974,2 -"node-gyp",0.0377305117,0.6211458053,-0.1173242042,"https://salsa.debian.org/js-team/node-gyp","https://github.com/nodejs/node-gyp.git",4297.5489699074,197,73,0,223,832,0,50,1053,3,"3",1.27037037037037,1.79012345679012 -"has-flag",0.3334743676,2.4592111562,-0.1192014058,"https://salsa.debian.org/js-team/node-has-flag","https://github.com/sindresorhus/has-flag",2203.7011111111,6,2,0,7,17,0,0,17,1,"1",1.25,2 -"inline-source-map",-1.7253778479,0.3256715997,-2.1428170788,"https://salsa.debian.org/js-team/node-inline-source-map","https://github.com/thlorenz/inline-source-map.git",3126.5302314815,5,5,0,9,25,0,0,25,2,"2",1.5,2 -"node-ip",0.5473402205,3.0729874251,-0.1357528421,"https://salsa.debian.org/js-team/node-ip","https://github.com/indutny/node-ip",3990.2488194445,6,20,0,17,172,0,0,173,3,"3",1.76923076923077,1.99421965317919 -"node-is-arrayish",-0.0113184631,2.4802704151,-0.5878636382,"https://salsa.debian.org/js-team/node-is-arrayish","https://github.com/qix-/node-is-arrayish",1162.9688194445,2,9,0,3,10,0,0,10,1,"1",1.81818181818182,2 -"is-glob",0.6638373369,3.8445632106,-0.214727985,"https://salsa.debian.org/js-team/node-is-glob","https://github.com/jonschlinkert/is-glob",2500.3032986111,3,9,0,5,18,0,0,18,1,"1",1.75,2 -"iscroll",0.3236470898,2.6334834534,-0.1547197624,"https://salsa.debian.org/js-team/node-iscroll","https://github.com/cubiq/iscroll",2222.4944791667,9,37,0,11,375,0,5,391,1,"1",1.80434782608696,1.95907928388747 -"jison",-2.8705191059,-0.5904861053,-3.3214497471,"https://salsa.debian.org/js-team/node-jison","https://github.com/zaach/jison",3961.6974305556,7,59,1,40,368,0,51,421,3,"3",1.89393939393939,1.87410926365796 -"jquery-mousewheel",0.2686821158,2.6543019787,-0.1911219866,"https://salsa.debian.org/js-team/node-jquery-mousewheel","https://github.com/jquery/jquery-mousewheel",5390.8646296296,6,15,1,14,292,0,0,293,4,"4",1.71428571428571,1.99658703071672 -"millstone",-1.4457365806,1.0910699973,-2.0387356121,"https://salsa.debian.org/js-team/node-millstone","https://github.com/mapbox/millstone",4176.2971875,3,21,0,13,36,0,0,37,3,"3",1.875,1.97297297297297 -"mqtt-packet",-2.1961592069,0.0425211631,-2.6185433222,"https://salsa.debian.org/js-team/node-mqtt-packet","https://github.com/mqttjs/mqtt-packet",3391.8497337963,19,27,0,34,71,0,0,77,2,"2",1.58695652173913,1.92207792207792 -"on-finished",0.0613223619,2.8531731142,-0.6913305342,"https://salsa.debian.org/js-team/node-on-finished","https://github.com/jshttp/on-finished",3350.0634259259,5,3,0,7,4,0,0,9,2,"2",1.375,1.44444444444444 -"once",-0.1226053888,-0.1171397715,-0.1237821835,"https://salsa.debian.org/js-team/node-once","https://github.com/isaacs/once.git",4074.419212963,2,6,0,6,15,0,0,15,3,"3",1.75,2 -"os-browserify",-0.3268262004,2.3252681953,-0.9671784701,"https://salsa.debian.org/js-team/node-os-browserify","https://github.com/CoderPuppy/os-browserify",1580.0713425926,1,7,0,3,9,0,0,9,1,"1",1.875,2 -"parse-glob",0.6847833884,3.868282575,-0.2490532696,"https://salsa.debian.org/js-team/node-parse-glob","https://github.com/micromatch/parse-glob",1589.2864351852,1,5,0,3,6,0,0,6,1,"1",1.83333333333333,2 -"parseurl",0.275713727,3.6232142368,-0.6473483724,"https://salsa.debian.org/js-team/node-parseurl","https://github.com/expressjs/parseurl.git",3251.1265972222,2,3,0,5,12,0,0,12,2,"2",1.6,2 -"FlashPolicyFileServer",-0.9515002748,1.7831825682,-1.7365256836,"https://salsa.debian.org/js-team/node-policyfile","https://github.com/3rd-Eden/FlashPolicyFileServer",2142.8337037037,0,3,0,3,14,0,0,14,1,"1",2,2 -"react-audio-player",-4.8100583491,-2.4298503474,-5.420558223,"https://salsa.debian.org/js-team/node-react-audio-player","https://github.com/justinmc/react-audio-player.git",2489.7878125,9,20,0,18,119,0,0,119,1,"1",1.68965517241379,2 -"regenerate-unicode-properties",-0.6674866267,0.9618352502,-1.0118784845,"https://salsa.debian.org/js-team/node-regenerate-unicode-properties","https://github.com/mathiasbynens/regenerate-unicode-properties",2664.7656597222,3,2,0,4,7,0,0,7,1,"1",1.4,2 -"regjsparser",-0.7798404163,1.2003365063,-1.1962820592,"https://salsa.debian.org/js-team/node-regjsparser","https://github.com/jviereck/regjsparser.git",3676.996875,2,16,0,12,27,0,0,27,2,"2",1.88888888888889,2 -"node-resolve",0.5575663073,3.2984179044,-0.1407771771,"https://salsa.debian.org/js-team/node-resolve","https://github.com/substack/node-resolve.git",4523.8015162037,39,26,0,50,258,0,0,259,3,"3",1.4,1.996138996139 -"sprintf.js",0.4014290609,3.1578856064,-0.2132993373,"https://salsa.debian.org/js-team/node-sprintf-js","https://github.com/alexei/sprintf.js",3813.8363078704,3,28,0,21,190,0,0,191,3,"3",1.90322580645161,1.99476439790576 -"static-module",-2.9295084562,0.0141965632,-3.6919322552,"https://salsa.debian.org/js-team/node-static-module","https://github.com/substack/static-module.git",3102.503912037,8,14,0,17,66,0,0,66,2,"2",1.63636363636364,2 -"node-stringprep",-1.25858701,1.4295408548,-2.2227266177,"https://salsa.debian.org/js-team/node-stringprep","https://github.com/node-xmpp/node-stringprep",2104.0097800926,2,22,0,18,115,0,1,118,1,"1",1.91666666666667,1.97457627118644 -"tape",-1.3533456222,0.8230887097,-1.8448352117,"https://salsa.debian.org/js-team/node-tape","https://github.com/ljharb/tape.git",4022.1372916667,54,62,0,96,488,0,0,500,3,"3",1.53448275862069,1.976 -"node-tar",0.10092401,1.1554569611,-0.1194951399,"https://salsa.debian.org/js-team/node-tar","https://github.com/npm/node-tar",4544.3033449074,24,18,1,38,142,0,0,162,3,"3",1.42857142857143,1.87654320987654 -"node-temp",-0.8998725735,2.4095798708,-1.9534582368,"https://salsa.debian.org/js-team/node-temp","https://github.com/bruce/node-temp",4595.6285416667,2,39,2,31,105,0,0,109,3,"3",1.95121951219512,1.96330275229358 -"json-document",-4.9532456218,-2.9019375195,-5.4554167334,"https://salsa.debian.org/js-team/node-trust-json-document","https://github.com/anvilresearch/json-document.git",471.8604513889,0,5,0,4,7,0,0,7,1,"1",2,2 -"tunnel-agent",1.1792785071,4.9631632678,0.1110924805,"https://salsa.debian.org/js-team/node-tunnel-agent","https://github.com/mikeal/tunnel-agent",1464.1568634259,0,12,0,9,131,0,0,132,1,"1",2,1.99242424242424 -"type-check",-0.619856367,1.5719870744,-1.0599876067,"https://salsa.debian.org/js-team/node-type-check","https://github.com/gkz/type-check.git",3579.125787037,2,5,0,3,20,0,1,21,2,"2",1.71428571428571,1.95238095238095 -"ultron",-2.7813197419,-0.4758682807,-3.3070168453,"https://salsa.debian.org/js-team/node-ultron","https://github.com/unshiftio/ultron",2972.2796527778,1,7,0,5,13,0,0,13,2,"2",1.875,2 -"node-unicode-data",-2.4986839661,-1.5066066307,-2.7694541364,"https://salsa.debian.org/js-team/node-unicode-data","https://github.com/mathiasbynens/node-unicode-data.git",3658.0537962963,6,3,0,7,29,0,0,29,2,"2",1.33333333333333,2 -"unicode-property-aliases",-2.1224965726,0.5054136483,-2.7508821504,"https://salsa.debian.org/js-team/node-unicode-property-aliases","https://github.com/mathiasbynens/unicode-property-aliases",2644.0663657408,2,1,0,3,4,0,0,4,1,"1",1.33333333333333,2 -"unicode-property-aliases-ecmascript",-0.4930241449,2.1362080223,-1.1371319719,"https://salsa.debian.org/js-team/node-unicode-property-aliases-ecmascript","https://github.com/mathiasbynens/unicode-property-aliases-ecmascript",1978.1429398148,1,2,0,2,3,0,0,3,1,"1",1.66666666666667,2 -"unicode-property-value-aliases",-2.108074165,0.5458957808,-2.7511821006,"https://salsa.debian.org/js-team/node-unicode-property-value-aliases","https://github.com/mathiasbynens/unicode-property-value-aliases.git",2643.9666898148,2,2,0,3,3,0,0,3,1,"1",1.5,2 -"unicode-property-value-aliases-ecmascript",-2.6459525399,-0.0300807748,-3.2844645306,"https://salsa.debian.org/js-team/node-unicode-property-value-aliases-ecmascript","https://github.com/mathiasbynens/unicode-property-value-aliases-ecmascript",1977.9928009259,0,1,0,1,0,0,0,1,1,"1",2,1 -"unicode-tr51",-2.8970799304,-0.9087592402,-3.3116008945,"https://salsa.debian.org/js-team/node-unicode-tr51","https://github.com/mathiasbynens/unicode-tr51",1619.1367939815,1,1,0,2,6,0,0,6,1,"1",1.5,2 -"utilities",0.7510248514,4.5416704471,-0.5676243448,"https://salsa.debian.org/js-team/node-utilities","https://github.com/mde/utilities.git",3873.0201388889,1,19,0,12,22,0,0,22,3,"3",1.95,2 -"node-uuid",0.283624179,1.6049599044,-0.0900742762,"https://salsa.debian.org/js-team/node-uuid","https://github.com/kelektiv/node-uuid",4670.2036805556,41,41,2,59,325,0,0,354,3,"3",1.5,1.9180790960452 -"node-v8flags",0.1190291187,2.504747846,-0.5070823362,"https://salsa.debian.org/js-team/node-v8flags","https://github.com/tkellen/node-v8flags.git",1721.1332407407,15,3,0,11,73,0,0,73,1,"1",1.16666666666667,2 -"vhost",-1.6545263406,0.6845370117,-2.2878465779,"https://salsa.debian.org/js-team/node-vhost","https://github.com/expressjs/vhost.git",3246.905150463,1,3,0,2,0,0,0,2,2,"2",1.75,1 -"vue-resource",-1.8045687517,-0.3856069237,-2.0705983161,"https://salsa.debian.org/js-team/node-vue-resource","https://github.com/pagekit/vue-resource",2754.4118518519,8,21,0,22,133,0,6,153,2,"2",1.72413793103448,1.86928104575163 -"webpack-merge",-3.8493072011,-1.380862227,-4.3376760901,"https://salsa.debian.org/js-team/node-webpack-merge","https://github.com/survivejs/webpack-merge.git",3033.8957060185,15,23,0,32,63,0,0,78,2,"2",1.60526315789474,1.80769230769231 -"node-ytdl-core",-0.1246800443,2.4581193839,-0.8183512675,"https://salsa.debian.org/js-team/node-ytdl-core","https://github.com/fent/node-ytdl-core.git",4096.004525463,70,23,0,76,490,0,0,521,3,"3",1.24731182795699,1.9404990403071 -"ntirpc",-0.5951678873,1.6658190607,-1.2552045305,"https://salsa.debian.org/debian/libntirpc","https://github.com/nfs-ganesha/ntirpc.git",4521.189837963,43,88,0,41,65,0,0,76,3,"3",1.67175572519084,1.85526315789474 -"Nuitka",-0.0866725521,0.7058083517,-0.4988086801,"https://github.com/Nuitka/Nuitka","https://github.com/Nuitka/Nuitka",4857.7762847222,166,5,3,152,130,0,0,253,3,"3",1.02923976608187,1.51383399209486 -"nvidia-xconfig",0.9734320248,2.4417272676,0.2943686593,"https://salsa.debian.org/nvidia-team/nvidia-xconfig","https://github.com/NVIDIA/nvidia-xconfig",5775.9081134259,1,3,0,4,2,0,0,6,4,"4",1.75,1.33333333333333 -"nvpy",-0.3144467073,2.8922861575,-1.2852911447,"https://github.com/stefanv/nvpy/tree/debian","https://github.com/stefanv/nvpy",2724.1981134259,2,29,0,16,0,0,0,16,1,"1",1.93548387096774,1 -"O-Saft",-0.0182736193,2.1999044406,-0.4504212317,"https://salsa.debian.org/pkg-security-team/o-saft","https://github.com/OWASP/O-Saft",4011.0202777778,3,10,0,9,40,0,0,40,3,"3",1.76923076923077,2 -"oar",-1.4634945941,-0.6606837191,-1.7817291006,"https://github.com/oar-team/oar","https://github.com/oar-team/oar",5765.8415856482,5,46,5,15,43,0,0,45,4,"4",1.90196078431373,1.95555555555556 -"obconf-debian",0.7475755733,1.7842164637,0.2203904311,"https://github.com/mati75/obconf-debian.git","https://github.com/mati75/obconf-debian.git",3725.6903935185,0,5,0,3,2,0,0,4,2,"2",2,1.5 -"obs-studio",0.1312922919,0.962234072,-0.1232421438,"https://salsa.debian.org/multimedia-team/obs-studio","https://github.com/jp9000/obs-studio.git",3726.9157986111,426,253,0,412,244,0,264,855,2,"2",1.37260677466863,1.28538011695906 -"obus",-3.5252462011,-1.6650389666,-4.1632184213,"https://salsa.debian.org/ocaml-team/obus","https://github.com/ocaml-community/obus",5340.5275115741,3,16,1,12,20,0,0,22,4,"4",1.84210526315789,1.90909090909091 -"ocaml-alsa",-0.6651242782,1.2653797989,-1.038375358,"https://salsa.debian.org/ocaml-team/ocaml-alsa","https://github.com/savonet/ocaml-alsa.git",460.5193634259,2,8,0,5,4,0,0,6,1,"1",1.8,1.66666666666667 -"ocaml-duppy",-1.3054931735,1.4664487385,-2.0959619861,"https://salsa.debian.org/ocaml-team/ocaml-duppy","https://github.com/savonet/ocaml-duppy.git",5432.8347337963,2,8,0,6,6,0,0,8,4,"4",1.8,1.75 -"ocaml-expect",-1.1271032549,2.7923660814,-2.3065192266,"https://salsa.debian.org/ocaml-team/ocaml-expect","https://github.com/gildor478/ocaml-expect.git",3170.2275231482,0,3,0,1,2,0,0,2,2,"2",2,2 -"extunix",-2.1872917146,-0.3028149378,-2.608406683,"https://salsa.debian.org/ocaml-team/ocaml-extunix","https://github.com/ygrek/extunix.git",4849.8496064815,10,12,0,18,30,0,0,33,3,"3",1.54545454545455,1.90909090909091 -"ocaml-ipaddr",-1.0446018994,1.8622042043,-1.7854758695,"https://salsa.debian.org/ocaml-team/ocaml-ipaddr","https://github.com/mirage/ocaml-ipaddr.git",3725.5192476852,9,20,0,22,40,0,0,40,2,"2",1.68965517241379,2 -"ocaml-re",-1.0950401153,1.1685448483,-1.5345632117,"https://salsa.debian.org/ocaml-team/ocaml-re","https://github.com/ocaml/ocaml-re",4365.6594907407,11,42,1,39,72,0,0,79,3,"3",1.79245283018868,1.91139240506329 -"sedlex",-2.795399504,0.6121377346,-3.6635666836,"https://salsa.debian.org/ocaml-team/ocaml-sedlex","https://github.com/ocaml-community/sedlex",5659.0575925926,13,22,0,27,81,0,0,81,4,"4",1.62857142857143,2 -"ocamlbuild",0.83301295,3.604633508,-0.2606702303,"https://salsa.debian.org/ocaml-team/ocamlbuild","https://github.com/ocaml/ocamlbuild.git",5691.866099537,18,45,0,44,121,0,0,131,4,"4",1.71428571428571,1.9236641221374 -"opencubicplayer",0.7353360216,1.8994727767,0.1001948826,"https://salsa.debian.org/multimedia-team/ocp","https://github.com/mywave82/opencubicplayer",4416.0663310185,9,13,0,12,37,0,0,38,3,"3",1.59090909090909,1.97368421052632 -"open-ath9k-htc-firmware",0.7603141973,2.9426626321,-0.0525201094,"https://salsa.debian.org/debian/open-ath9k-htc-firmware","https://github.com/qca/open-ath9k-htc-firmware.git",3892.0404398148,5,21,0,17,37,0,4,51,3,"3",1.80769230769231,1.72549019607843 -"openbox-debian",0.3587708308,0.5696355779,0.2001738591,"https://github.com/mati75/openbox-debian","https://github.com/mati75/openbox-debian",3123.4283217593,2,10,0,8,12,0,0,12,2,"2",1.83333333333333,2 -"openbox-menu",0.6431292738,3.0088710056,-0.1389880185,"https://github.com/mati75/openbox-menu.git","https://github.com/mati75/openbox-menu.git",2669.041875,1,4,0,4,3,0,0,4,1,"1",1.8,1.75 -"OpenCC",0.0219092289,0.4824222963,-0.1611861662,"https://salsa.debian.org/debian/opencc","https://github.com/BYVoid/OpenCC",3838.8327430556,56,72,0,83,474,0,3,480,3,"3",1.5625,1.9875 -"opendht",-1.502253613,-0.1124423197,-1.9255361455,"https://salsa.debian.org/debian/opendht","https://github.com/savoirfairelinux/opendht.git",3308.8721527778,32,40,0,40,23,0,13,63,2,"2",1.55555555555556,1.36507936507937 -"orocos_kinematics_dynamics",-0.4945558152,0.6669109207,-0.7546541561,"https://salsa.debian.org/science-team/orocos-kdl","https://github.com/orocos/orocos_kinematics_dynamics.git",5760.2385532407,20,61,0,49,251,0,0,254,4,"4",1.75308641975309,1.98818897637795 -"osdlyrics",-1.0107652487,2.5410275398,-1.9364271071,"https://salsa.debian.org/debian/osdlyrics","https://github.com/osdlyrics/osdlyrics.git",5185.1183796296,14,35,0,23,0,0,1,24,4,"4",1.71428571428571,1 -"osm-gps-map",0.4852394822,1.6315652979,0.0288716929,"https://salsa.debian.org/debian-gis-team/osm-gps-map","https://github.com/nzjrs/osm-gps-map",5396.5783564815,12,33,1,30,59,0,0,67,4,"4",1.73333333333333,1.88059701492537 -"ossim",0.2194206159,1.4101222421,-0.3093741078,"https://salsa.debian.org/debian-gis-team/ossim","https://github.com/ossimlabs/ossim.git",2917.9942824074,12,49,0,31,11,0,1,36,2,"2",1.80327868852459,1.30555555555556 -"osslsigncode",0.169238484,2.9087642476,-0.725862886,"https://salsa.debian.org/debian/osslsigncode","https://github.com/mtrojnar/osslsigncode.git",3941.3454282407,25,12,0,28,157,0,0,162,3,"3",1.32432432432432,1.96913580246914 -"ostinato",-0.1569756889,1.8345639417,-0.7645775616,"https://salsa.debian.org/debian/ostinato","https://github.com/pstavirs/ostinato",3046.7549884259,4,10,3,11,90,0,2,95,2,"2",1.71428571428571,1.94736842105263 -"othman",-1.2792306,0.9010183816,-1.7193110897,"https://salsa.debian.org/islamic-team/othman","https://github.com/ojuba-org/othman.git",4827.9828240741,2,13,0,8,20,0,0,21,3,"3",1.86666666666667,1.95238095238095 -"ounit",-0.3627412562,0.4497117871,-0.6191203191,"https://salsa.debian.org/ocaml-team/ounit","https://github.com/gildor478/ounit.git",1284.2142476852,12,7,0,14,26,0,0,26,1,"1",1.36842105263158,2 -"outguess",0.1497827549,1.0974956579,-0.226083673,"https://salsa.debian.org/pkg-security-team/outguess","https://github.com/resurrecting-open-source-projects/outguess",1029.0813888889,1,3,0,2,9,0,0,9,1,"1",1.75,2 -"overpass-api-python-wrapper",-0.0322169908,2.6635478479,-0.7275603387,"https://salsa.debian.org/python-team/packages/overpass","https://github.com/mvexel/overpass-api-python-wrapper.git",2968.0383449074,4,26,0,24,100,0,0,102,2,"2",1.86666666666667,1.98039215686275 -"papi",0.1648741367,1.7494996599,-0.3472045276,"https://salsa.debian.org/hpc-team/papi","https://github.com/icl-utk-edu/papi",5785.0656134259,65,102,1,48,33,0,13,73,4,"4",1.61077844311377,1.45205479452055 -"par2cmdline",0.20056085,0.9463023937,-0.114418384,"https://salsa.debian.org/jcfp/par2cmdline","https://github.com/Parchive/par2cmdline.git",4198.3890972222,9,27,0,27,115,0,0,117,3,"3",1.75,1.98290598290598 -"parsedatetime",1.1943669328,3.3711848516,0.3370468439,"https://salsa.debian.org/python-team/packages/parsedatetime","https://github.com/bear/parsedatetime",3739.2471990741,8,57,2,39,150,0,0,150,2,"2",1.87692307692308,2 -"patsy",0.2674917865,1.4192573153,-0.1261483397,"https://salsa.debian.org/med-team/patsy","https://github.com/pydata/patsy",4676.8131944445,3,15,0,17,197,0,0,199,3,"3",1.83333333333333,1.98994974874372 -"pavucontrol-qt",1.2464488625,4.8736917607,0.1529128395,"https://salsa.debian.org/lxqt-team/pavucontrol-qt","https://github.com/lxqt/pavucontrol-qt.git",5699.7374189815,142,57,0,110,74,0,0,152,4,"4",1.28643216080402,1.48684210526316 -"pbcopper",-1.3874159842,-0.0972708879,-1.836455251,"https://salsa.debian.org/med-team/pbcopper","https://github.com/PacificBiosciences/pbcopper.git",2608.9496875,0,25,0,9,5,0,0,11,1,"1",2,1.45454545454545 -"pcapfix",0.0933295762,2.1324165499,-0.3712900504,"https://salsa.debian.org/debian/pcapfix","https://github.com/Rup0rt/pcapfix",3586.925,0,13,0,6,14,0,0,14,2,"2",2,2 -"pcapy",0.0349538125,1.2547992825,-0.3075562935,"https://salsa.debian.org/python-team/packages/pcapy","https://github.com/CoreSecurity/pcapy.git",1937.2327893519,7,20,0,17,91,0,6,99,1,"1",1.74074074074074,1.91919191919192 -"pcl",-0.4344154152,-0.1858665736,-0.5376364213,"https://salsa.debian.org/science-team/pcl","https://github.com/PointCloudLibrary/pcl",4663.6967824074,183,548,3,326,69,0,19,379,3,"3",1.74965800273598,1.1820580474934 -"pcmanfm",0.9104711528,1.3106826431,0.6098723045,"https://salsa.debian.org/lxde-team/pcmanfm","https://github.com/lxde/pcmanfm",5014.9549074074,162,27,0,87,11,0,0,91,4,"4",1.14285714285714,1.12087912087912 -"flext",-0.0850254405,1.799559297,-0.6918728933,"https://salsa.debian.org/multimedia-team/pd/pd-flext","https://github.com/grrrr/flext.git",5601.7882986111,3,10,0,6,23,0,0,23,4,"4",1.76923076923077,2 -"ggee",0.2137381335,2.1051137101,-0.4192763849,"https://salsa.debian.org/multimedia-team/pd/pd-ggee","https://github.com/pd-externals/ggee",5602.6691782407,2,15,0,6,8,0,0,10,4,"4",1.88235294117647,1.8 -"pd-iemmatrix",-0.3267928639,1.4162291626,-0.7027745657,"https://salsa.debian.org/multimedia-team/pd/pd-iemmatrix","https://github.com/iem-projects/pd-iemmatrix",5648.0384606482,0,11,0,2,0,0,0,2,4,"4",2,1 -"pdfminer.six",0.0208023168,1.0139403963,-0.2584702373,"https://salsa.debian.org/python-team/packages/pdfminer","https://github.com/pdfminer/pdfminer.six.git",5691.1447916667,73,66,0,116,635,0,0,663,4,"4",1.47482014388489,1.9577677224736 -"peek",0.2213731786,2.283866536,-0.2790469573,"https://salsa.debian.org/debian/peek","https://github.com/phw/peek.git",2556.2171064815,148,23,0,127,504,0,0,601,1,"1",1.13450292397661,1.83860232945092 -"perftest",-0.25506659,1.1624795547,-0.6480880894,"https://salsa.debian.org/hpc-team/perftest","https://github.com/linux-rdma/perftest.git",5766.2372222222,45,67,0,63,139,0,1,158,4,"4",1.59821428571429,1.87974683544304 -"perl-cross-debian",0.5442661596,4.5107736512,-0.7462109296,"https://github.com/codehelp/perl-cross-debian","https://github.com/codehelp/perl-cross-debian",413.1343634259,0,1,2,1,2,0,1,3,1,"1",2,1.66666666666667 -"project--perl-depends",-0.098094395,2.6971113742,-0.7916189031,"https://salsa.debian.org/perl-team/modules/packages/perl-depends","https://github.com/jaalto/project--perl-depends.git",2417.02125,0,1,0,1,0,0,0,1,1,"1",2,1 -"perl6-readline",0.2335812759,2.6358883052,-0.5015207605,"https://salsa.debian.org/perl6-team/modules/perl6-readline","https://github.com/drforr/perl6-readline.git",1710.4289351852,3,11,0,10,39,0,0,39,1,"1",1.78571428571429,2 -"zef",-0.1589879333,1.6245616073,-0.6015634669,"https://salsa.debian.org/perl6-team/modules/perl6-zef","https://github.com/ugexe/zef.git",3805.8422569445,19,20,0,23,111,0,0,113,3,"3",1.51282051282051,1.98230088495575 -"persp-projectile",-0.639585185,3.286323439,-1.7735281377,"https://salsa.debian.org/emacsen-team/persp-projectile","https://github.com/bbatsov/persp-projectile.git",2006.7800810185,9,2,0,10,40,0,0,40,1,"1",1.18181818181818,2 -"pev",0.3261969594,2.6071816741,-0.2973930728,"https://salsa.debian.org/debian/pev","https://github.com/merces/pev",0.0019791667,1,1,0,1,0,0,0,1,1,"1",1.5,1 -"pexpect",0.8141215364,1.9888952072,0.2667748433,"https://salsa.debian.org/python-team/packages/pexpect","https://github.com/pexpect/pexpect",5767.4715740741,21,92,0,85,558,0,0,562,4,"4",1.8141592920354,1.99288256227758 -"pg_checksums",-1.8213442024,-0.1372969868,-2.2303187848,"https://salsa.debian.org/postgresql/pg-checksums","https://github.com/credativ/pg_checksums.git",1977.03125,1,6,0,4,9,0,0,9,1,"1",1.85714285714286,2 -"pg_fact_loader",-1.8451499975,1.7612439253,-2.8557684329,"https://salsa.debian.org/postgresql/pg-fact-loader","https://github.com/enova/pg_fact_loader.git",1795.1245717593,2,6,0,5,3,0,0,5,1,"1",1.75,1.6 -"pg8000",-0.425873307,2.4793925595,-1.2002236195,"https://salsa.debian.org/python-team/packages/pg8000","https://github.com/mfenniak/pg8000",3962.2166666667,11,25,0,20,142,0,0,145,3,"3",1.69444444444444,1.97931034482759 -"pgbadger",-0.3152167506,1.8941783522,-0.7500435836,"https://salsa.debian.org/postgresql/pgbadger","https://github.com/darold/pgbadger.git",4259.9847222222,12,88,0,68,205,0,7,250,3,"3",1.88,1.82 -"pgsql-ogr-fdw",-1.597217053,1.098990575,-2.2031431994,"https://salsa.debian.org/debian-gis-team/pgsql-ogr-fdw","https://github.com/pramsey/pgsql-ogr-fdw.git",3285.0248958333,8,10,0,9,59,0,0,59,2,"2",1.55555555555556,2 -"semver",0.409271213,2.8658685018,-0.146438012,"https://salsa.debian.org/php-team/pear/php-composer-semver","https://github.com/composer/semver",2969.0927777778,37,21,0,44,78,0,1,97,2,"2",1.36206896551724,1.80412371134021 -"Console_Table",-0.0495487945,1.7830511717,-0.4127695523,"https://salsa.debian.org/php-team/pear/php-console-table","https://github.com/pear/Console_Table.git",2649.3105555556,1,12,0,9,14,0,0,16,1,"1",1.92307692307692,1.875 -"constant_time_encoding",-2.0834505626,2.1057169386,-3.3638483931,"https://salsa.debian.org/php-team/pear/php-constant-time","https://github.com/paragonie/constant_time_encoding",2771.7821296296,7,11,0,13,33,0,0,33,2,"2",1.61111111111111,2 -"Crypt_GPG",0.9210658037,4.3264478549,-0.3696792994,"https://salsa.debian.org/php-team/pear/php-crypt-gpg","https://github.com/pear/Crypt_GPG.git",5743.4965972222,6,19,0,16,21,0,0,22,4,"4",1.76,1.95454545454545 -"DirectoryScanner",-0.4493402088,1.855270065,-0.9050981717,"https://salsa.debian.org/php-team/pear/php-directory-scanner","https://github.com/theseer/DirectoryScanner.git",4264.1542361111,0,7,0,2,12,0,0,12,3,"3",2,2 -"link-util",-0.4425381847,2.4746022946,-1.2653714987,"https://salsa.debian.org/php-team/pear/php-fig-link-util","https://github.com/php-fig/link-util",1680.1398148148,5,2,0,5,11,0,0,12,1,"1",1.28571428571429,1.91666666666667 -"php-file-iterator",0.3114533151,2.1129587477,-0.2420172005,"https://salsa.debian.org/php-team/pear/php-file-iterator","https://github.com/sebastianbergmann/php-file-iterator",5147.3262731482,9,12,0,16,79,0,0,80,4,"4",1.57142857142857,1.9875 -"horde",-0.4754819462,0.1936727976,-0.7289488029,"https://salsa.debian.org/horde-team/php-horde","https://github.com/horde/horde.git",3269.665474537,81,80,0,67,71,0,0,99,2,"2",1.49689440993789,1.71717171717172 -"ActiveSync",-0.0745412838,1.9029925216,-0.5969694129,"https://salsa.debian.org/horde-team/php-horde-activesync","https://github.com/horde/ActiveSync.git",4982.0443055556,9,18,0,13,5,0,0,14,4,"4",1.66666666666667,1.35714285714286 -"html5-php",-0.3208200552,2.1227649729,-0.8298475571,"https://salsa.debian.org/php-team/pear/php-masterminds-html5","https://github.com/Masterminds/html5-php",3846.3884953704,7,39,1,37,85,0,6,98,3,"3",1.84782608695652,1.86734693877551 -"vfsStream",-3.8146826401,-1.3125722962,-4.3356315795,"https://salsa.debian.org/php-team/pear/php-mikey179-vfsstream","https://github.com/bovigo/vfsStream",5683.6370138889,11,48,1,35,196,0,26,222,4,"4",1.8135593220339,1.88288288288288 -"monolog",0.5054135947,3.1708681094,-0.3793108578,"https://salsa.debian.org/php-team/pear/php-monolog","https://github.com/Seldaek/monolog",4676.6184375,183,372,3,397,405,0,63,719,3,"3",1.67027027027027,1.56328233657858 -"TypeResolver",0.0218360214,2.3125319388,-0.4129888352,"https://salsa.debian.org/php-team/pear/php-phpdocumentor-type-resolver","https://github.com/phpDocumentor/TypeResolver",3092.0947569445,18,31,1,40,91,0,0,91,2,"2",1.63265306122449,2 -"phpseclib",0.1530214382,1.601109808,-0.1147352727,"https://salsa.debian.org/php-team/pear/phpseclib","https://github.com/phpseclib/phpseclib.git",5749.2331828704,80,98,0,135,155,0,5,268,4,"4",1.55056179775281,1.57835820895522 -"sql-formatter",-0.407920411,2.2773849827,-1.1530054701,"https://salsa.debian.org/php-team/pear/php-sql-formatter","https://github.com/doctrine/sql-formatter.git",4125.6360300926,10,31,0,25,28,0,0,42,3,"3",1.75609756097561,1.66666666666667 -"contracts",0.6071508908,3.5307618183,-0.1882490235,"https://salsa.debian.org/php-team/pear/php-symfony-contracts","https://github.com/symfony/contracts",1906.8477083333,28,26,0,51,11,0,0,57,1,"1",1.48148148148148,1.19298245614035 -"polyfill",0.5936130532,2.9045150589,-0.1004774059,"https://salsa.debian.org/php-team/pear/php-symfony-polyfill","https://github.com/symfony/polyfill",2902.2220949074,100,47,0,117,227,0,0,263,2,"2",1.31972789115646,1.86311787072243 -"text_password",0.8003864076,3.7354461105,-0.2651582454,"https://salsa.debian.org/php-team/pear/php-text-password","https://github.com/pear/text_password.git",3427.7869097222,0,13,0,7,6,0,0,8,2,"2",2,1.75 -"php-text-template",0.2735156083,2.2577473237,-0.2649626383,"https://salsa.debian.org/php-team/pear/php-text-template","https://github.com/sebastianbergmann/php-text-template",5133.0452083333,0,8,0,5,13,0,0,13,4,"4",2,2 -"CssToInlineStyles",-4.9581043824,-2.5632479534,-5.4701338922,"https://salsa.debian.org/php-team/pear/php-tijsverkoyen-css-to-inline-styles","https://github.com/tijsverkoyen/CssToInlineStyles",4791.6600810185,7,34,0,31,149,0,0,158,3,"3",1.82926829268293,1.94303797468354 -"php-timer",0.0545002782,1.7354029969,-0.3034123852,"https://salsa.debian.org/php-team/pear/php-timer","https://github.com/sebastianbergmann/php-timer",4962.9242824074,4,10,0,11,38,0,0,38,3,"3",1.71428571428571,2 -"php-token-stream",-0.077539845,1.0314574326,-0.3184738926,"https://salsa.debian.org/php-team/pear/php-token-stream","https://github.com/sebastianbergmann/php-token-stream",4281.2169675926,15,15,0,18,77,0,0,77,3,"3",1.5,2 -"phpdox",-1.0964679734,0.6066407752,-1.5664870339,"https://salsa.debian.org/php-team/pear/phpdox","https://github.com/theseer/phpdox",4604.8372800926,11,44,0,36,366,0,0,368,3,"3",1.8,1.9945652173913 -"phpLDAPadmin",0.9538106411,1.6007846261,0.5030751444,"https://salsa.debian.org/php-team/pear/phpldapadmin","https://github.com/leenooks/phpLDAPadmin",5264.4283796296,42,25,0,26,189,0,1,192,4,"4",1.37313432835821,1.984375 -"phploc",-0.6743294156,1.1227196643,-1.1328550897,"https://salsa.debian.org/php-team/pear/phploc","https://github.com/sebastianbergmann/phploc",5362.0425347222,18,31,0,38,226,0,0,226,4,"4",1.63265306122449,2 -"phpseclib",-0.073403609,1.2483282321,-0.3161589858,"https://salsa.debian.org/php-team/pear/phpseclib","https://github.com/phpseclib/phpseclib.git",5749.2331828704,80,98,0,135,155,0,5,268,4,"4",1.55056179775281,1.57835820895522 -"comparator",0.1016908786,2.3398889578,-0.3301518045,"https://salsa.debian.org/php-team/pear/phpunit-comparator","https://github.com/sebastianbergmann/comparator",3686.3957291667,20,9,0,25,105,0,0,105,2,"2",1.31034482758621,2 -"pidcat",-0.2348175331,2.8745190447,-1.069688066,"https://salsa.debian.org/python-team/packages/pidcat","https://github.com/JakeWharton/pidcat.git",3155.524837963,4,40,0,30,259,0,0,261,2,"2",1.90909090909091,1.99233716475096 -"Piexif",-0.8041956898,1.6330932338,-1.3844176603,"https://salsa.debian.org/python-team/packages/piexif","https://github.com/hMatoba/Piexif",3307.7984837963,5,12,0,10,155,0,0,155,2,"2",1.70588235294118,2 -"pipewalker",0.5020627732,3.1638761301,-0.3613058019,"https://salsa.debian.org/debian/pipewalker","https://github.com/artemsen/pipewalker",2088.9552662037,1,4,0,3,6,0,0,6,1,"1",1.8,2 -"pipexec",-0.2552786974,1.5523174274,-0.6883958099,"https://salsa.debian.org/alteholz/pipexec","https://github.com/flonatel/pipexec.git",3308.5569560185,0,11,0,6,12,0,0,13,2,"2",2,1.92307692307692 -"pk4",-1.8075865154,0.2000705346,-2.2307798324,"https://github.com/Debian/pk4","https://github.com/Debian/pk4",1044.0391203704,0,1,0,1,4,0,0,4,1,"1",2,2 -"pkcs11-helper",1.2104032601,4.0753663669,0.2461129198,"https://salsa.debian.org/opensc-team/pkcs11-helper","https://github.com/OpenSC/pkcs11-helper",5754.4088194445,16,2,0,13,58,0,3,61,4,"4",1.11111111111111,1.95081967213115 -"pkgconf",-0.0511523264,0.6206735889,-0.2703346973,"https://salsa.debian.org/debian/pkgconf","https://github.com/pkgconf/pkgconf",4516.657650463,52,29,1,67,201,0,9,219,3,"3",1.35802469135802,1.91780821917808 -"pktstat",2.3338787395,6.0502882403,0.926044188,"https://salsa.debian.org/debian/pktstat","https://github.com/dleonard0/pktstat",2938.7848958333,0,4,0,2,5,0,0,5,2,"2",2,2 -"planetblupi",-0.2798326789,2.3368636861,-0.892136731,"https://salsa.debian.org/games-team/planetblupi","https://github.com/blupi-games/planetblupi",2504.3208449074,5,7,1,9,18,0,0,20,1,"1",1.58333333333333,1.9 -"gmailfeed",-0.9078350467,1.5377434382,-1.4604242885,"https://salsa.debian.org/qt-kde-team/extras/plasma-gmailfeed","https://github.com/anthon38/gmailfeed.git",2727.0607638889,3,4,0,4,17,0,0,17,1,"1",1.57142857142857,2 -"plastex",0.2432695472,2.6132312475,-0.7011641781,"https://salsa.debian.org/python-team/packages/plastex","https://github.com/plastex/plastex",5539.2969907407,17,19,1,19,79,0,1,80,4,"4",1.52777777777778,1.9875 -"pngquant",0.5997315487,2.7135905645,-0.2341425934,"https://salsa.debian.org/debian-phototools-team/pngquant","https://github.com/kornelski/pngquant.git",4325.0383333333,23,38,0,41,383,0,0,386,3,"3",1.62295081967213,1.99222797927461 -"pngquant",0.7530300912,2.4617924213,0.0694002171,"https://salsa.debian.org/debian-phototools-team/pngquant","https://github.com/kornelski/pngquant.git",4325.0383333333,23,38,0,41,383,0,0,386,3,"3",1.62295081967213,1.99222797927461 -"pocketsphinx",-0.1321092966,0.4767106106,-0.3322064688,"https://salsa.debian.org/a11y-team/pocketsphinx","https://github.com/cmusphinx/pocketsphinx",5652.4787847222,5,30,2,19,191,0,5,206,4,"4",1.85714285714286,1.92718446601942 -"pocl",0.0943083762,0.5327681562,-0.1315933389,"https://salsa.debian.org/opencl-team/pocl","https://github.com/pocl/pocl",4689.6507291667,26,119,2,96,172,0,16,235,3,"3",1.82068965517241,1.73191489361702 -"popt",0.8457741179,1.4698340745,0.461614112,"https://salsa.debian.org/debian/popt","https://github.com/rpm-software-management/popt.git",5739.6746643519,38,10,0,43,33,0,0,60,4,"4",1.20833333333333,1.55 -"portalocker",-0.6761775694,1.2289979494,-1.0819015205,"https://salsa.debian.org/python-team/packages/portalocker","https://github.com/WoLpH/portalocker",4590.8550231482,5,21,0,17,76,0,0,76,3,"3",1.80769230769231,2 -"postfixadmin",1.3718594968,2.8225561724,0.562614351,"https://salsa.debian.org/debian/postfixadmin","https://github.com/postfixadmin/postfixadmin",5760.0218055556,53,77,1,94,124,0,0,183,4,"4",1.59230769230769,1.6775956284153 -"postgis-java",-0.2249511782,0.6204972087,-0.4368391732,"https://salsa.debian.org/debian-gis-team/postgis-java","https://github.com/postgis/postgis-java.git",5635.3241319445,8,12,0,15,32,0,1,39,4,"4",1.6,1.82051282051282 -"autodoc",0.4941840875,2.0445546371,-0.1932500455,"https://salsa.debian.org/debian/postgresql-autodoc","https://github.com/cbbrowne/autodoc.git",4575.8853587963,5,13,0,11,24,0,0,24,3,"3",1.72222222222222,2 -"pg_filedump",-0.6115611941,1.2319618721,-1.0974123114,"https://salsa.debian.org/postgresql/postgresql-filedump","https://github.com/df7cb/pg_filedump.git",4622.5029861111,3,6,0,6,19,0,0,21,3,"3",1.66666666666667,1.9047619047619 -"postgresql-hll",-1.5534816636,0.6872065961,-2.2881681018,"https://salsa.debian.org/postgresql/postgresql-hll","https://github.com/citusdata/postgresql-hll.git",3859.4959259259,23,21,0,27,124,0,0,126,3,"3",1.47727272727273,1.98412698412698 -"mysql_fdw",-1.2606174982,0.3226021522,-1.7176084858,"https://salsa.debian.org/postgresql/postgresql-mysql-fdw","https://github.com/EnterpriseDB/mysql_fdw.git",4475.7229861111,5,27,0,22,248,0,0,249,3,"3",1.84375,1.99598393574297 -"postgresql-numeral",-1.5134522364,1.6243431313,-2.293706422,"https://github.com/df7cb/postgresql-numeral","https://github.com/df7cb/postgresql-numeral",2361.1246527778,0,4,0,2,3,0,0,3,1,"1",2,2 -"plsh",-1.6026559782,-0.4185729412,-1.9028536338,"https://salsa.debian.org/postgresql/postgresql-plsh","https://github.com/petere/plsh.git",3969.9145023148,1,1,0,2,23,0,0,23,3,"3",1.5,2 -"postgrey",0.4162125811,0.8007795616,0.16790509,"https://salsa.debian.org/debian/postgrey","https://github.com/schweikert/postgrey.git",5469.9499074074,10,14,0,22,75,0,0,83,4,"4",1.58333333333333,1.90361445783133 -"postsrsd",0.10383995,2.0191274283,-0.4773257062,"https://salsa.debian.org/debian/postsrsd","https://github.com/roehling/postsrsd.git",4014.2085648148,10,17,0,4,30,0,0,33,3,"3",1.62962962962963,1.90909090909091 -"potool",-0.5814294404,0.0587787858,-0.834772415,"https://github.com/porridge/potool/tree/debian","https://github.com/porridge/potool",4430.2149884259,2,3,0,2,1,0,0,3,3,"3",1.6,1.33333333333333 -"povray",0.9584216742,1.6940449747,0.4892724706,"https://salsa.debian.org/debian/povray","https://github.com/POV-Ray/povray",2833.0740740741,8,15,7,14,45,0,2,50,2,"2",1.65217391304348,1.9 -"powa-archivist",-1.3322892717,0.6277535501,-1.7515157782,"https://github.com/powa-team/powa-archivist","https://github.com/powa-team/powa-archivist",3471.9301967593,10,15,2,15,40,0,0,42,2,"2",1.6,1.95238095238095 -"powercap",-0.3284328359,2.6169095108,-1.1283456001,"https://github.com/connorimes/powercap/tree/debian","https://github.com/connorimes/powercap",2525.9958912037,0,4,0,2,2,0,0,3,1,"1",2,1.66666666666667 -"pqiv",-0.1638813895,0.7585584788,-0.4540092183,"https://salsa.debian.org/pberndt-guest/pqiv","https://github.com/phillipberndt/pqiv",5604.8415509259,11,12,0,15,127,0,0,127,4,"4",1.52173913043478,2 -"prboom-plus",0.97864662,1.8842985584,0.4320575143,"https://salsa.debian.org/games-team/prboom-plus","https://github.com/coelckers/prboom-plus",5585.983912037,42,11,1,41,53,0,1,73,4,"4",1.20754716981132,1.72602739726027 -"primus",0.2729569091,1.2481073389,-0.1134531508,"https://salsa.debian.org/nvidia-team/primus","https://github.com/amonakov/primus",937.9013425926,3,6,0,6,216,0,0,216,1,"1",1.66666666666667,2 -"bird_exporter",-3.477178786,-0.0329330544,-4.2892202007,"https://salsa.debian.org/go-team/packages/prometheus-bird-exporter","https://github.com/czerwonk/bird_exporter",2542.4624768519,10,16,6,19,56,0,0,57,1,"1",1.61538461538462,1.98245614035088 -"haproxy_exporter",-3.8607213348,-2.0700503351,-4.3161894613,"https://salsa.debian.org/go-team/packages/prometheus-haproxy-exporter","https://github.com/prometheus/haproxy_exporter",3672.0941203704,21,40,0,41,166,0,0,171,2,"2",1.65573770491803,1.97076023391813 -"postfix_exporter",-2.309018579,-0.0678780093,-2.9354675488,"https://salsa.debian.org/go-team/packages/prometheus-postfix-exporter","https://github.com/kumina/postfix_exporter",2274.256712963,7,24,0,20,129,0,0,130,1,"1",1.7741935483871,1.99230769230769 -"pushgateway",-0.8937395968,2.0265228669,-1.5977918562,"https://salsa.debian.org/go-team/packages/prometheus-pushgateway","https://github.com/prometheus/pushgateway",3606.187337963,18,76,1,58,280,0,0,292,2,"2",1.80851063829787,1.95890410958904 -"proot-debian",1.0920103364,3.4894212371,0.1526188422,"https://github.com/ivoire/proot-debian","https://github.com/ivoire/proot-debian",508.0834837963,0,2,0,1,3,0,0,3,1,"1",2,2 -"prospector",-0.1396414973,2.1237521604,-0.9708127034,"https://salsa.debian.org/python-team/packages/prospector","https://github.com/PyCQA/prospector",3767.6942939815,36,66,2,76,313,0,0,327,2,"2",1.64705882352941,1.95718654434251 -"ps2eps",1.532120796,4.5656897613,0.4495361846,"https://salsa.debian.org/debian/ps2eps","https://github.com/roland-bless/ps2eps.git",0.1197453704,1,2,0,1,1,0,0,2,1,"1",1.66666666666667,1.5 -"psad",-0.1576432836,0.28089801,-0.427371641,"https://salsa.debian.org/debian/psad","https://github.com/mrash/psad/commits/master",5185.326875,55,11,0,0,0,0,0,0,4,"4",1.16666666666667,NA -"pudb",0.5652873271,3.503587652,-0.3825137639,"https://salsa.debian.org/debian/pudb","https://github.com/inducer/pudb.git",5292.8559490741,32,73,0,84,306,0,0,318,4,"4",1.6952380952381,1.9622641509434 -"puppetlabs-ntp",-1.6019329854,0.0840048992,-1.9766118562,"https://salsa.debian.org/puppet-team/puppet-module-puppetlabs-ntp","https://github.com/puppetlabs/puppetlabs-ntp.git",4661.5050231482,40,171,0,118,228,0,0,234,3,"3",1.81042654028436,1.97435897435897 -"py-lmdb",-0.075515578,2.3670377588,-0.9569815252,"https://salsa.debian.org/debian/py-lmdb","https://github.com/jnwatson/py-lmdb",3712.4741898148,18,23,0,26,205,0,0,207,2,"2",1.5609756097561,1.99033816425121 -"fe",0.0569254607,2.238596245,-0.7405534191,"https://salsa.debian.org/python-team/packages/py-postgresql","https://github.com/python-postgres/fe",5231.8056712963,1,11,0,5,69,0,0,69,4,"4",1.91666666666667,2 -"py-radix",-0.2347152131,1.2849195969,-0.668352957,"https://salsa.debian.org/python-team/packages/py-radix","https://github.com/mjschultz/py-radix",1374.4915856482,3,11,0,9,39,0,0,40,1,"1",1.78571428571429,1.975 -"py-ubjson",0.3258683606,2.3051690362,-0.1923435128,"https://salsa.debian.org/python-team/packages/py-ubjson","https://github.com/Iotic-Labs/py-ubjson",2987.1609027778,3,4,0,5,12,0,0,13,2,"2",1.57142857142857,1.92307692307692 -"pycairo",1.8611353266,3.0551049835,1.1479506832,"https://salsa.debian.org/python-team/packages/pycairo","https://github.com/pygobject/pycairo",2389.8532175926,13,23,2,28,234,0,0,236,1,"1",1.63888888888889,1.99152542372881 -"pychm",0.1959778752,1.6504366967,-0.1847897986,"https://salsa.debian.org/python-team/packages/pychm","https://github.com/dottedmag/pychm.git",3381.7747222222,2,4,0,3,19,0,0,19,2,"2",1.66666666666667,2 -"pychromecast",0.0550333172,1.8645058973,-0.3583381658,"https://salsa.debian.org/python-team/packages/pychromecast","https://github.com/home-assistant-libs/pychromecast.git",3717.1753935185,57,30,0,74,318,0,0,345,2,"2",1.3448275862069,1.92173913043478 -"pycoast",-0.9264089102,1.0445653141,-1.3282069805,"https://salsa.debian.org/debian-gis-team/pycoast","https://github.com/pytroll/pycoast",3185.132662037,7,21,0,12,29,0,0,30,2,"2",1.75,1.96666666666667 -"pydenticon",-0.865220641,1.8522581651,-1.5367272325,"https://salsa.debian.org/python-team/packages/pydenticon","https://github.com/azaghal/pydenticon",1376.6938657407,2,1,0,2,13,0,0,13,1,"1",1.33333333333333,2 -"pydicom",0.3543730908,1.939756419,-0.1871292016,"https://salsa.debian.org/med-team/pydicom","https://github.com/pydicom/pydicom.git",5576.1416435185,69,58,0,87,155,0,4,210,4,"4",1.45669291338583,1.73809523809524 -"pydocstyle",0.5531580789,3.8832816133,-0.434312514,"https://salsa.debian.org/python-team/packages/pydocstyle","https://github.com/PyCQA/pydocstyle.git",4295.4277893519,58,44,0,86,381,0,0,394,3,"3",1.43137254901961,1.96700507614213 -"PyHamcrest",0.4770044067,2.0276091701,-0.0667553805,"https://salsa.debian.org/python-team/packages/pyhamcrest","https://github.com/hamcrest/PyHamcrest",5756.5347222222,18,36,0,32,112,0,0,113,4,"4",1.66666666666667,1.99115044247788 -"pylama",-0.1685043243,2.3124561576,-0.8358206635,"https://salsa.debian.org/python-team/packages/pylama","https://github.com/klen/pylama",3643.0438888889,6,46,0,37,127,0,0,134,2,"2",1.88461538461538,1.94776119402985 -"pylast",0.1007769388,2.2899648047,-0.3798195506,"https://salsa.debian.org/python-team/packages/pylast","https://github.com/pylast/pylast",5565.5985532407,8,38,2,32,125,0,0,130,4,"4",1.82608695652174,1.96153846153846 -"pylibtiff",0.0190555879,2.1644424074,-0.7692360791,"https://salsa.debian.org/debian-gis-team/pylibtiff","https://github.com/pearu/pylibtiff.git",3040.1433796296,10,20,0,22,100,0,1,103,2,"2",1.66666666666667,1.97087378640777 -"pymca",-0.4153476895,-0.1437047675,-0.5016872933,"https://salsa.debian.org/science-team/pymca","https://github.com/vasole/pymca",5785.8055439815,7,32,0,17,52,0,0,52,4,"4",1.82051282051282,2 -"pymediainfo",0.3813327313,2.7232285427,-0.3112268398,"https://salsa.debian.org/python-team/packages/pymediainfo","https://github.com/sbraz/pymediainfo",4970.7511111111,10,7,0,12,111,0,0,112,3,"3",1.41176470588235,1.99107142857143 -"pymodbus",0.0732799109,1.8646692265,-0.5844401794,"https://salsa.debian.org/python-team/packages/pymodbus","https://github.com/pymodbus-dev/pymodbus.git",5499.738599537,102,63,0,125,552,0,0,603,4,"4",1.38181818181818,1.91542288557214 -"pyopencl",0.1782677537,0.865226367,-0.1694455174,"https://salsa.debian.org/opencl-team/python-pyopencl","https://github.com/inducer/pyopencl",5374.16875,28,83,0,77,238,0,0,251,4,"4",1.74774774774775,1.94820717131474 -"pyorbital",-0.835136266,1.1503801119,-1.2127768903,"https://salsa.debian.org/debian-gis-team/pyorbital","https://github.com/pytroll/pyorbital.git",4467.5734606482,9,33,0,26,73,0,0,75,3,"3",1.78571428571429,1.97333333333333 -"pypuppetdb",-1.329401636,2.4185219671,-2.4698360721,"https://salsa.debian.org/python-team/packages/pypuppetdb","https://github.com/voxpupuli/pypuppetdb",3781.8189814815,18,46,2,46,103,0,0,106,3,"3",1.71875,1.97169811320755 -"pyqi",-0.6659052808,0.4267300657,-0.9064389106,"https://salsa.debian.org/med-team/pyqi","https://github.com/biocore/pyqi",1051.0106481482,0,13,1,7,17,0,0,17,1,"1",2,2 -"pyquery",0.2533160207,2.1476722718,-0.276904445,"https://salsa.debian.org/python-team/packages/pyquery","https://github.com/gawel/pyquery.git",5354.1741550926,7,50,0,45,213,0,0,222,4,"4",1.87719298245614,1.95945945945946 -"pysodium",-0.9250342629,1.6337160906,-1.6304178321,"https://salsa.debian.org/python-team/packages/pysodium","https://github.com/stef/pysodium.git",3761.6783217593,9,38,0,33,63,0,0,66,2,"2",1.80851063829787,1.95454545454545 -"python-soundfile",-0.4259563033,1.9817809485,-0.87334628,"https://salsa.debian.org/multimedia-team/pysoundfile","https://github.com/bastibe/python-soundfile.git",3757.2281481482,8,31,0,27,287,0,0,287,2,"2",1.7948717948718,2 -"pysph",-0.1957650825,0.8352828367,-0.6085553873,"https://salsa.debian.org/science-team/pysph","https://github.com/pypr/pysph",3944.0042824074,12,53,0,27,60,0,0,66,3,"3",1.81538461538462,1.90909090909091 -"pysrs",-2.5865636963,-0.2466583264,-3.0140171336,"https://salsa.debian.org/python-team/packages/pysrs","https://github.com/sdgathman/pysrs.git",5232.0373842593,2,4,0,2,7,0,0,7,4,"4",1.66666666666667,2 -"pyssim",-1.4493782429,1.5830189811,-2.3198514231,"https://salsa.debian.org/python-team/packages/pyssim","https://github.com/jterrace/pyssim",4069.879375,2,12,0,7,3,0,0,8,3,"3",1.85714285714286,1.375 -"PyStaticConfiguration",-2.0472160299,0.7630493618,-2.7265555606,"https://salsa.debian.org/python-team/packages/pystaticconfiguration","https://github.com/dnephin/PyStaticConfiguration",3745.7102662037,3,26,2,20,44,0,0,45,2,"2",1.89655172413793,1.97777777777778 -"pysubnettree",-0.9461476097,1.2999152117,-1.5398813128,"https://salsa.debian.org/python-team/packages/pysubnettree","https://github.com/zeek/pysubnettree.git",4655.7478587963,1,18,0,11,28,0,0,30,3,"3",1.94736842105263,1.93333333333333 -"pytest-arraydiff",0.1898441175,2.3416228263,-0.2394386956,"https://salsa.debian.org/python-team/packages/pytest-arraydiff","https://github.com/astrofrog/pytest-arraydiff",2688.582349537,5,12,0,11,0,0,0,11,1,"1",1.70588235294118,1 -"pytest-bdd",-3.4287681139,-0.5039458847,-4.2303785564,"https://salsa.debian.org/python-team/packages/pytest-bdd","https://github.com/pytest-dev/pytest-bdd.git",3909.5599768519,26,45,0,50,355,0,0,365,3,"3",1.63380281690141,1.97260273972603 -"pytest-expect",-1.4175585643,1.7604433826,-2.2515689023,"https://salsa.debian.org/python-team/packages/pytest-expect","https://github.com/gsnedders/pytest-expect",1755.9376273148,2,3,0,2,13,0,0,13,1,"1",1.6,2 -"pytest-pylint",-0.8320096401,0.1532890227,-1.1006353608,"https://salsa.debian.org/python-team/packages/pytest-pylint","https://github.com/carsongee/pytest-pylint",3089.6046180556,5,20,0,19,97,0,0,97,2,"2",1.8,2 -"pytest-remotedata",0.030168843,1.6486281266,-0.2466155852,"https://salsa.debian.org/python-team/packages/pytest-remotedata","https://github.com/astropy/pytest-remotedata",4372.8560069445,4,28,1,27,27,0,1,44,3,"3",1.875,1.61363636363636 -"pytest-sugar",-1.9343898664,0.0895529374,-2.5336128329,"https://salsa.debian.org/python-team/packages/pytest-sugar","https://github.com/Teemu/pytest-sugar.git",3774.5057060185,13,48,0,45,191,0,0,199,3,"3",1.78688524590164,1.95979899497487 -"py-amqp",0.4927928639,2.9780373711,-0.1037801308,"https://salsa.debian.org/python-team/packages/python-amqp","https://github.com/celery/py-amqp.git",5725.5644791667,68,43,0,82,220,0,0,249,4,"4",1.38738738738739,1.88353413654618 -"argh",0.2339030674,2.0159100899,-0.2686508718,"https://salsa.debian.org/python-team/packages/python-argh","https://github.com/neithere/argh.git",4744.0471875,5,24,0,22,102,0,0,107,3,"3",1.82758620689655,1.95327102803738 -"asyncssh",-1.1827053689,0.2562433063,-1.6493196582,"https://salsa.debian.org/python-team/packages/python-asyncssh","https://github.com/ronf/asyncssh",3723.8668634259,18,9,0,23,71,0,0,87,2,"2",1.33333333333333,1.81609195402299 -"python-atomicwrites",0.8071747449,3.936888395,-0.0360579534,"https://salsa.debian.org/python-team/packages/python-atomicwrites","https://github.com/untitaker/python-atomicwrites",2718.0744907407,9,8,0,15,53,0,0,53,1,"1",1.47058823529412,2 -"avro",-0.6764070684,0.594195245,-0.9704692662,"https://salsa.debian.org/python-team/packages/python-avro","https://github.com/apache/avro",5362.5630555556,342,76,0,310,0,0,0,310,4,"4",1.18181818181818,1 -"aws-xray-sdk-python",-0.6565672961,2.2186104229,-1.3887187484,"https://salsa.debian.org/science-team/python-aws-xray-sdk","https://github.com/aws/aws-xray-sdk-python",2264.9942939815,64,31,0,69,93,0,0,126,1,"1",1.32631578947368,1.73809523809524 -"azure-python-devtools",-1.8877692262,1.0407212341,-2.6897741774,"https://salsa.debian.org/python-team/packages/python-azure-devtools","https://github.com/Azure/azure-python-devtools",1688.8337962963,6,14,0,12,28,0,0,31,1,"1",1.7,1.90322580645161 -"b2-sdk-python",-2.7091203496,0.0195888217,-3.2985895116,"https://salsa.debian.org/python-team/packages/python-b2sdk","https://github.com/Backblaze/b2-sdk-python.git",2948.6294907407,24,86,0,77,61,0,0,112,2,"2",1.78181818181818,1.54464285714286 -"babel",0.4571086267,1.1252224199,0.1143783436,"https://salsa.debian.org/python-team/packages/python-babel","https://github.com/python-babel/babel",5776.7216782407,75,93,2,137,127,0,0,236,4,"4",1.55357142857143,1.53813559322034 -"base58",-0.6380025418,1.8870432293,-1.1948721512,"https://salsa.debian.org/python-team/packages/python-base58","https://github.com/keis/base58",3504.7240046296,9,12,0,15,37,0,0,38,2,"2",1.57142857142857,1.97368421052632 -"bayespy",-0.4133726859,2.2939543254,-1.2809021253,"https://salsa.debian.org/science-team/python-bayespy","https://github.com/bayespy/bayespy",4227.6050231482,4,9,0,7,68,0,0,68,3,"3",1.69230769230769,2 -"bcrypt",0.720872399,2.4323524124,0.0873154337,"https://salsa.debian.org/python-team/packages/python-bcrypt","https://github.com/pyca/bcrypt.git",3870.0652083333,26,10,0,30,196,0,0,198,3,"3",1.27777777777778,1.98989898989899 -"python-blosc",0.4104792893,2.7209909901,-0.2401314247,"https://salsa.debian.org/python-team/packages/python-blosc","https://github.com/Blosc/python-blosc.git",4736.2912268519,17,36,0,37,120,0,0,121,3,"3",1.67924528301887,1.99173553719008 -"boltons",-0.0997518599,2.672673187,-0.8614154477,"https://salsa.debian.org/python-team/packages/python-boltons","https://github.com/mahmoud/boltons",3938.2483333333,42,55,0,73,206,0,0,206,3,"3",1.56701030927835,2 -"bumps",-0.8935367246,0.0933032097,-1.1605313205,"https://salsa.debian.org/science-team/python-bumps","https://github.com/bumps/bumps",4409.9511574074,1,19,0,10,22,0,0,24,3,"3",1.95,1.91666666666667 -"cachetools",0.5221597712,3.3731185733,-0.2589146292,"https://salsa.debian.org/python-team/packages/python-cachetools","https://github.com/tkem/cachetools",3511.0841203704,2,11,0,11,206,0,0,206,2,"2",1.84615384615385,2 -"certbot",-2.2720142983,0.1157477766,-2.775909363,"https://salsa.debian.org/letsencrypt-team/certbot/certbot-dns-dnsimple","https://github.com/certbot/certbot.git",4226.9669907407,268,343,0,391,635,0,143,1074,3,"3",1.56137479541735,1.59124767225326 -"certbot",-0.8998199839,1.9089794558,-1.5782805062,"https://salsa.debian.org/letsencrypt-team/certbot/certbot-dns-google","https://github.com/certbot/certbot.git",4226.9669907407,268,343,0,391,635,0,143,1074,3,"3",1.56137479541735,1.59124767225326 -"certbot",-0.2811377468,1.8247084979,-0.7514361439,"https://salsa.debian.org/letsencrypt-team/certbot/certbot-dns-rfc2136","https://github.com/certbot/certbot.git",4226.9669907407,268,343,0,391,635,0,143,1074,3,"3",1.56137479541735,1.59124767225326 -"certbot",-1.1000615706,1.1834717942,-1.6727445902,"https://salsa.debian.org/letsencrypt-team/certbot/certbot-dns-route53","https://github.com/certbot/certbot.git",4226.9669907407,268,343,0,391,635,0,143,1074,3,"3",1.56137479541735,1.59124767225326 -"cmarkgfm",-1.3150135933,1.231941831,-1.8951479522,"https://salsa.debian.org/python-team/packages/python-cmarkgfm","https://github.com/theacodes/cmarkgfm",1977.4600578704,18,8,0,20,50,0,0,50,1,"1",1.30769230769231,2 -"colorama",0.7784754841,2.4846627407,0.147974244,"https://salsa.debian.org/python-team/packages/python-colorama","https://github.com/tartley/colorama",3514.6796527778,15,42,0,45,341,0,1,348,2,"2",1.73684210526316,1.97988505747126 -"python-colorlog",0.0760601286,2.176247301,-0.417655582,"https://salsa.debian.org/python-team/packages/python-colorlog","https://github.com/borntyping/python-colorlog.git",4104.9554398148,10,24,0,30,43,0,0,56,3,"3",1.70588235294118,1.76785714285714 -"colormap",-0.8079814337,1.468837378,-1.3890414287,"https://salsa.debian.org/python-team/packages/python-colormap","https://github.com/cokelaer/colormap",3308.9144444445,1,7,0,6,15,0,0,15,2,"2",1.875,2 -"pythonfutures",0.253069403,1.4926901749,-0.0680161382,"https://salsa.debian.org/python-team/modules/python-concurrent.futures","https://github.com/agronholm/pythonfutures.git",4929.1742592593,10,12,0,14,86,0,0,86,3,"3",1.54545454545455,2 -"ConfigArgParse",0.6238780174,3.3511057459,-0.0441913435,"https://salsa.debian.org/python-team/packages/configargparse","https://github.com/bw2/ConfigArgParse",3315.6581828704,8,51,0,44,239,0,1,240,2,"2",1.86440677966102,1.99583333333333 -"css-parser",0.7375204292,3.6525325545,-0.047073823,"https://salsa.debian.org/python-team/packages/python-css-parser","https://github.com/ebook-utils/css-parser",1765.7022685185,2,7,0,7,11,0,0,11,1,"1",1.77777777777778,2 -"cssselect",0.7663890486,3.666235057,-0.0218050513,"https://salsa.debian.org/python-team/packages/python-cssselect","https://github.com/scrapy/cssselect",5713.5145601852,8,23,0,24,65,0,1,68,4,"4",1.74193548387097,1.95588235294118 -"pycups",0.7229281241,2.1065141416,0.1579248085,"https://salsa.debian.org/python-team/packages/python-cups","https://github.com/OpenPrinting/pycups.git",5524.6673842593,4,9,0,9,62,0,1,68,4,"4",1.69230769230769,1.91176470588235 -"curtsies",0.3166501906,2.6067653967,-0.304611589,"https://salsa.debian.org/sramacher/python-curtsies","https://github.com/bpython/curtsies",3799.8890277778,15,32,1,35,70,0,0,73,3,"3",1.68085106382979,1.95890410958904 -"cycler",0.6283830281,2.4968734847,0.0195972629,"https://salsa.debian.org/python-team/packages/python-cycler","https://github.com/matplotlib/cycler",2790.0141087963,6,19,2,21,28,0,0,35,2,"2",1.76,1.8 -"cytoolz",-0.3584848,2.3538098789,-1.0758303941,"https://salsa.debian.org/python-team/packages/python-cytoolz","https://github.com/pytoolz/cytoolz",3395.421412037,2,21,0,16,68,0,0,71,2,"2",1.91304347826087,1.95774647887324 -"python-darkslide",0.9320448351,4.4954117391,-0.2883231751,"https://salsa.debian.org/debian/darkslide","https://github.com/ionelmc/python-darkslide.git",4282.7612268519,4,56,0,42,23,0,0,55,3,"3",1.93333333333333,1.41818181818182 -"DartsPyLRU",-1.8927494334,0.2922334772,-2.3461638638,"https://salsa.debian.org/pkg-security-team/python-darts.lib.utils.lru","https://github.com/deterministic-arts/DartsPyLRU.git",362.9079398148,0,2,0,1,5,0,0,5,1,"1",2,2 -"datrie",-0.50605789,1.3803188391,-0.9784823552,"https://salsa.debian.org/python-team/packages/python-datrie","https://github.com/kmike/datrie.git",2978.6536226852,7,11,0,14,90,0,2,92,2,"2",1.61111111111111,1.97826086956522 -"python-dbusmock",-0.627944788,0.3000038238,-0.8505709773,"https://salsa.debian.org/python-team/packages/python-dbusmock","https://github.com/martinpitt/python-dbusmock",4100.7724189815,32,16,0,31,57,0,0,63,3,"3",1.33333333333333,1.9047619047619 -"decorator",0.4704212561,1.7923957087,0.0135959484,"https://salsa.debian.org/python-team/packages/python-decorator","https://github.com/micheles/decorator.git",5376.3999537037,6,23,0,23,131,0,0,131,4,"4",1.79310344827586,2 -"django-braces",-1.2510273472,0.3406489189,-1.6388153686,"https://salsa.debian.org/python-team/packages/python-django-braces","https://github.com/brack3t/django-braces.git",4108.7193865741,10,79,0,65,196,0,0,196,3,"3",1.8876404494382,2 -"django-cas",-1.1534352121,1.6719173633,-2.0695177654,"https://salsa.debian.org/python-team/packages/python-django-casclient","https://github.com/kstateome/django-cas",2792.0546875,7,19,0,16,53,0,0,54,2,"2",1.73076923076923,1.98148148148148 -"django-extra-views",-1.2587713718,1.08523072,-1.8662212132,"https://salsa.debian.org/python-team/packages/python-django-extra-views","https://github.com/AndrewIngram/django-extra-views",4072.4001041667,12,61,1,51,205,0,0,208,3,"3",1.83561643835616,1.98557692307692 -"django-imagekit",-1.3510241486,0.3749851789,-1.7864034212,"https://salsa.debian.org/python-team/packages/python-django-imagekit","https://github.com/matthewwithanm/django-imagekit.git",5386.1103935185,18,69,0,65,458,0,0,463,4,"4",1.79310344827586,1.98920086393089 -"django-modelcluster",-3.9620317451,-2.0344269896,-4.3414266404,"https://salsa.debian.org/python-team/packages/python-django-modelcluster","https://github.com/wagtail/django-modelcluster.git",3534.2000347222,21,13,0,29,118,0,0,119,2,"2",1.38235294117647,1.99159663865546 -"django-rest-framework-guardian",-3.3209075154,-1.1464196518,-3.751236078,"https://salsa.debian.org/python-team/packages/python-django-rest-framework-guardian","https://github.com/rpkilby/django-rest-framework-guardian.git",626.7550231481,2,4,0,4,14,0,0,14,1,"1",1.66666666666667,2 -"django-rest-hooks",-1.5050875724,1.1869723949,-2.1906025512,"https://salsa.debian.org/python-team/packages/python-django-rest-hooks","https://github.com/zapier/django-rest-hooks",2693.6027777778,12,13,0,20,56,0,0,57,1,"1",1.52,1.98245614035088 -"django-split-settings",-2.7895751152,-0.3987847133,-3.3101515707,"https://salsa.debian.org/python-team/packages/python-django-split-settings","https://github.com/sobolevn/django-split-settings",3860.1584027778,17,13,0,20,39,0,0,46,3,"3",1.43333333333333,1.84782608695652 -"django-storages",-3.1386978641,-0.5967779923,-3.725863839,"https://salsa.debian.org/python-team/packages/python-django-storages","https://github.com/jschneier/django-storages.git",4486.1115740741,175,96,0,225,717,0,2,835,3,"3",1.35424354243542,1.85868263473054 -"django-treebeard",-1.4430134685,-0.7351656258,-1.6842741632,"https://salsa.debian.org/python-team/packages/python-django-treebeard","https://github.com/django-treebeard/django-treebeard.git",5493.911400463,24,59,0,65,267,0,0,278,4,"4",1.71084337349398,1.96043165467626 -"python-dmidecode",0.6965127554,2.3773186195,-0.1244349613,"https://salsa.debian.org/python-team/packages/python-dmidecode","https://github.com/nima/python-dmidecode",5342.5758333333,10,17,0,11,26,0,0,28,4,"4",1.62962962962963,1.92857142857143 -"dnsq",-0.8493777922,1.6513810932,-1.4106021621,"https://salsa.debian.org/python-team/packages/python-dnsq","https://github.com/mailgun/dnsq.git",1028.9045138889,1,6,0,4,14,0,0,15,1,"1",1.85714285714286,1.93333333333333 -"python-dotenv",-0.0646647075,2.8616640278,-0.9758026604,"https://salsa.debian.org/debian/python-dotenv","https://github.com/theskumar/python-dotenv.git",3676.0798726852,81,18,0,84,565,0,1,569,2,"2",1.18181818181818,1.99297012302285 -"dpkt",0.019610667,2.4762696052,-0.5848881328,"https://salsa.debian.org/python-team/packages/python-dpkt","https://github.com/kbandla/dpkt",3886.9183680556,36,43,1,56,220,0,1,222,3,"3",1.54430379746835,1.99099099099099 -"dropbox-sdk-python",-0.1301813578,2.8452134881,-0.8655819935,"https://salsa.debian.org/python-team/packages/python-dropbox","https://github.com/dropbox/dropbox-sdk-python",2984.0770833333,28,31,0,31,49,0,0,71,2,"2",1.52542372881356,1.69014084507042 -"python-dugong",-0.5914713911,0.3761740468,-0.8252986097,"https://salsa.debian.org/python-team/packages/python-dugong","https://github.com/python-dugong/python-dugong.git",3200.2688541667,4,5,0,7,9,0,0,11,2,"2",1.55555555555556,1.81818181818182 -"easydev",-1.0634186539,0.4092421308,-1.417126244,"https://salsa.debian.org/python-team/packages/python-easydev","https://github.com/cokelaer/easydev.git",3717.344375,0,5,0,1,10,0,0,10,2,"2",2,2 -"easywebdav",-0.193448412,1.9590581698,-0.6371910366,"https://salsa.debian.org/python-team/packages/python-easywebdav","https://github.com/amnong/easywebdav",813.3765625,1,13,0,8,75,0,0,75,1,"1",1.92857142857143,2 -"exif-py",0.0156493175,1.0036035588,-0.2489350249,"https://salsa.debian.org/python-team/packages/python-exif","https://github.com/ianare/exif-py",3998.0291898148,34,23,0,51,195,0,0,195,3,"3",1.40350877192982,2 -"fabio",0.0104950221,1.2100758664,-0.4380511126,"https://salsa.debian.org/science-team/python-fabio","https://github.com/silx-kit/fabio.git",5765.1214351852,18,45,0,33,54,0,0,60,4,"4",1.71428571428571,1.9 -"fitsio",-0.4610557174,0.3940574407,-0.637876907,"https://salsa.debian.org/debian-astro-team/python-fitsio","https://github.com/esheldon/fitsio",4439.4105671296,4,32,0,25,107,0,0,108,3,"3",1.88888888888889,1.99074074074074 -"flaky",-0.8238726702,2.0811606782,-1.6526698831,"https://salsa.debian.org/python-team/packages/python-flaky","https://github.com/box/flaky.git",3089.6002083333,11,23,0,21,145,0,0,145,2,"2",1.67647058823529,2 -"fysom",-0.7585603333,1.38289184,-1.1858234109,"https://salsa.debian.org/debian/python-fysom","https://github.com/mriehl/fysom.git",3641.9876967593,3,22,0,13,39,0,0,40,2,"2",1.88,1.975 -"geneimpacts",-1.8069134623,0.4508156575,-2.2387477164,"https://salsa.debian.org/med-team/python-geneimpacts","https://github.com/brentp/geneimpacts/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA -"genty",-1.5312416046,1.7202436984,-2.3792600782,"https://salsa.debian.org/python-team/packages/python-genty","https://github.com/box/genty.git",701.8032986111,0,10,0,5,15,0,0,15,1,"1",2,2 -"glad",-1.3457272309,1.093467749,-1.9015379081,"https://salsa.debian.org/python-team/packages/glad","https://github.com/Dav1dde/glad.git",3530.1536458333,54,19,0,28,255,0,3,266,2,"2",1.26027397260274,1.95864661654135 -"python-gnupg",0.3458917214,1.220869917,-0.050061794,"https://salsa.debian.org/python-team/packages/python-gnupg","https://github.com/vsajip/python-gnupg.git",3594.9863773148,6,12,0,14,52,0,0,58,2,"2",1.66666666666667,1.89655172413793 -"gnuplotlib",-0.5540723096,1.9911774543,-1.1225767623,"https://salsa.debian.org/python-team/packages/python-gnuplotlib","https://github.com/dkogan/gnuplotlib",3062.559849537,1,2,0,2,29,0,0,29,2,"2",1.66666666666667,2 -"graphviz",-0.2775267395,1.2889253499,-0.6503415057,"https://salsa.debian.org/python-team/packages/python-graphviz","https://github.com/xflr6/graphviz",3612.6320833333,12,12,0,22,48,0,0,60,2,"2",1.5,1.8 -"greenlet",0.8047616843,1.7061049423,0.3070462935,"https://salsa.debian.org/python-team/packages/python-greenlet","https://github.com/python-greenlet/greenlet",5315.6529166667,21,53,1,60,350,0,0,351,4,"4",1.71621621621622,1.997150997151 -"python-gssapi",0.3289179765,2.3550255223,-0.2500485627,"https://salsa.debian.org/python-team/packages/python-gssapi","https://github.com/pythongssapi/python-gssapi",3263.0338078704,18,17,0,25,97,0,0,99,2,"2",1.48571428571429,1.97979797979798 -"h11",0.0628463609,2.5298903305,-0.3966248627,"https://salsa.debian.org/python-team/packages/python-h11","https://github.com/python-hyper/h11.git",2700.4708217593,21,14,0,28,99,0,0,99,1,"1",1.4,2 -"httplib2",0.5220301337,1.5281004855,0.118057713,"https://salsa.debian.org/python-team/packages/python-httplib2","https://github.com/httplib2/httplib2.git",5422.7818402778,50,36,0,58,150,0,9,186,4,"4",1.41860465116279,1.80645161290323 -"httptools",-1.016257232,1.5255190337,-1.6306842731,"https://salsa.debian.org/python-team/packages/python-httptools","https://github.com/MagicStack/httptools.git",2908.9019444445,11,7,0,15,96,0,0,97,2,"2",1.38888888888889,1.98969072164948 -"idna",0.428827323,2.3998733008,0.0023232441,"https://salsa.debian.org/python-team/packages/python-idna","https://github.com/kjd/idna",3836.1993865741,12,16,2,22,107,0,0,107,3,"3",1.57142857142857,2 -"ijson",-0.7882494907,1.6183503032,-1.3435678266,"https://salsa.debian.org/debian/python-ijson","https://github.com/ICRAR/ijson.git",4844.9471180556,7,21,0,19,91,0,0,100,3,"3",1.75,1.91 -"intervaltree-bio",-0.5864931947,1.6648991521,-1.1805901394,"https://salsa.debian.org/med-team/python-intervaltree-bio","https://github.com/konstantint/intervaltree-bio.git",961.9282638889,0,5,0,4,7,0,0,7,1,"1",2,2 -"ipaddr-py",0.6433933144,3.2903739444,-0.0419910302,"https://salsa.debian.org/python-team/modules/python-ipaddr","https://github.com/google/ipaddr-py/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA -"ipaddress",0.6123592223,3.1947690745,-0.0003839016,"https://salsa.debian.org/python-team/modules/python-ipaddress","https://github.com/phihag/ipaddress",2728.476099537,1,7,0,6,56,0,0,56,1,"1",1.875,2 -"python-ipcalc",0.7141016308,3.4398389904,-0.255334424,"https://github.com/craneworks/python-ipcalc","https://github.com/craneworks/python-ipcalc",756.8280324074,1,1,0,0,1,0,0,1,1,"1",1.5,2 -"python-iptables",-1.3768945792,-0.1620145007,-1.5972298957,"https://salsa.debian.org/python-team/packages/python-iptables","https://github.com/ldx/python-iptables",4469.2364236111,3,51,0,40,238,0,0,240,3,"3",1.94444444444444,1.99166666666667 -"python-isc-dhcp-leases",-1.2144164676,1.3723753572,-1.7887539722,"https://salsa.debian.org/python-team/packages/python-isc-dhcp-leases","https://github.com/MartijnBraam/python-isc-dhcp-leases",3184.8126041667,4,9,0,8,31,0,0,31,2,"2",1.69230769230769,2 -"itsdangerous",0.6642302819,3.2169189216,-0.0415160477,"https://salsa.debian.org/python-team/packages/python-itsdangerous","https://github.com/pallets/itsdangerous",4546.9291435185,24,19,0,40,182,0,0,188,3,"3",1.44186046511628,1.96808510638298 -"jellyfish",0.0674101012,2.0051276836,-0.4205869787,"https://salsa.debian.org/python-team/packages/python-jellyfish","https://github.com/jamesturk/jellyfish",4902.3308101852,15,24,0,27,148,0,0,148,3,"3",1.61538461538462,2 -"jira",-0.3980829938,2.423176583,-1.0411208861,"https://salsa.debian.org/python-team/packages/python-jira","https://github.com/pycontribs/jira",4267.40125,111,155,3,195,572,0,0,670,3,"3",1.58270676691729,1.85373134328358 -"jmespath.py",0.3629172949,2.0686645362,-0.1003834425,"https://salsa.debian.org/python-team/packages/python-jmespath","https://github.com/jmespath/jmespath.py",3691.1897222222,12,21,0,28,14,0,1,37,2,"2",1.63636363636364,1.37837837837838 -"josepy",0.3513511179,2.2923963637,-0.0869215969,"https://salsa.debian.org/letsencrypt-team/certbot/josepy","https://github.com/certbot/josepy",4184.7847685185,104,276,0,285,46,0,0,308,3,"3",1.72631578947368,1.14935064935065 -"python-junit-xml",-0.4874384495,3.2461576764,-1.4580304291,"https://salsa.debian.org/python-team/packages/python-junit-xml","https://github.com/kyrus/python-junit-xml.git",2595.0297685185,5,18,0,13,67,0,0,69,1,"1",1.78260869565217,1.97101449275362 -"kajiki",-2.3594950912,-1.2299434314,-2.6159157482,"https://salsa.debian.org/python-team/packages/python-kajiki","https://github.com/jackrosenthal/kajiki",4546.9668518519,3,22,0,18,30,0,0,33,3,"3",1.88,1.90909090909091 -"kaptan",-0.238361389,2.3964025525,-0.8063707104,"https://salsa.debian.org/debian/python-kaptan","https://github.com/emre/kaptan.git",3814.6996064815,6,17,0,16,32,0,0,32,3,"3",1.73913043478261,2 -"python-libarchive-c",0.2084355293,1.8864921166,-0.3011849402,"https://salsa.debian.org/debian/python-libarchive-c","https://github.com/Changaco/python-libarchive-c.git",3365.1853587963,15,18,0,22,69,0,0,71,2,"2",1.54545454545455,1.97183098591549 -"libnacl",-0.5748525142,1.055075496,-0.9944771692,"https://salsa.debian.org/python-team/packages/python-libnacl","https://github.com/saltstack/libnacl.git",3360.8544791667,4,45,0,34,71,0,0,72,2,"2",1.91836734693878,1.98611111111111 -"python-libusb1",0.2265462586,3.5735295241,-0.6911313873,"https://salsa.debian.org/python-team/packages/python-libusb1","https://github.com/vpelletier/python-libusb1.git",5022.3082060185,13,14,0,21,84,0,0,85,4,"4",1.51851851851852,1.98823529411765 -"python-lz4",0.2828189113,1.8016304752,-0.1138420548,"https://salsa.debian.org/python-team/packages/python-lz4","https://github.com/python-lz4/python-lz4.git",3988.215625,8,43,0,37,148,0,0,158,3,"3",1.84313725490196,1.93670886075949 -"python-lzo",0.6457852422,3.6246917685,-0.1788164823,"https://salsa.debian.org/python-team/packages/python-lzo","https://github.com/jd-boyd/python-lzo",4282.0784259259,2,13,0,10,69,0,0,70,3,"3",1.86666666666667,1.98571428571429 -"python-mapnik",-0.22946102,0.3549703224,-0.441137685,"https://salsa.debian.org/debian-gis-team/python-mapnik","https://github.com/mapnik/python-mapnik.git",5494.8782638889,10,101,0,63,101,0,0,150,4,"4",1.90990990990991,1.67333333333333 -"MechanicalSoup",-0.5139427981,1.6546261984,-1.0099675897,"https://salsa.debian.org/python-team/packages/python-mechanicalsoup","https://github.com/hickford/MechanicalSoup",3488.7486574074,39,28,0,46,149,0,0,164,2,"2",1.41791044776119,1.90853658536585 -"mechanize",0.5587118446,1.5296801165,0.1098543172,"https://salsa.debian.org/python-team/packages/python-mechanize","https://github.com/python-mechanize/mechanize.git",5735.6054513889,5,12,0,14,81,0,0,548,4,"4",1.70588235294118,1.1478102189781 -"meld3",1.4808008162,4.1711738218,0.4100529738,"https://salsa.debian.org/python-team/packages/python-meld3","https://github.com/supervisor/meld3.git",4279.117650463,0,8,0,7,27,0,0,27,3,"3",2,2 -"PyMemoize",-1.6877152559,1.1203038488,-2.4079093642,"https://salsa.debian.org/debian/python-memoize","https://github.com/mikeboers/PyMemoize",4629.8626388889,2,6,0,5,18,0,0,19,3,"3",1.75,1.94736842105263 -"memprof",-1.0055408653,0.6195771117,-1.559509906,"https://salsa.debian.org/python-team/packages/python-memprof","https://github.com/jmdana/memprof",2110.1480324074,1,8,0,5,18,0,0,18,1,"1",1.88888888888889,2 -"MIDIUtil",-0.4550519333,2.0970578814,-0.9760105027,"https://salsa.debian.org/multimedia-team/python-midiutil","https://github.com/MarkCWirt/MIDIUtil.git",532.2564583333,2,4,0,2,47,0,0,47,1,"1",1.66666666666667,2 -"python-miio",-2.4535132218,0.0572909827,-2.9975615853,"https://salsa.debian.org/python-team/packages/miio","https://github.com/rytilahti/python-miio.git",2467.2539236111,163,5,0,156,136,0,0,270,1,"1",1.0297619047619,1.5037037037037 -"python-mimeparse",0.635087679,2.3635412747,-0.0635295991,"https://salsa.debian.org/python-team/modules/python-mimeparse","https://github.com/dbtsai/python-mimeparse.git",3368.8721296296,9,11,0,12,20,0,0,23,2,"2",1.55,1.8695652173913 -"motor",-1.6905579654,-0.1116236972,-2.117236641,"https://salsa.debian.org/python-team/packages/python-motor","https://github.com/mongodb/motor",3986.9431365741,28,30,0,47,2,0,0,47,3,"3",1.51724137931034,1.04255319148936 -"pymox",-0.4239911007,2.121473449,-1.1839102652,"https://salsa.debian.org/debian/python-mox","https://github.com/ivancrneto/pymox",3025.5165856482,3,7,0,5,8,0,0,10,2,"2",1.7,1.8 -"python-mpd2",-0.2990738247,0.3266786344,-0.4283928832,"https://salsa.debian.org/mpd-team/python-mpd","https://github.com/Mic92/python-mpd2",5765.5434143519,16,38,0,43,139,0,0,139,4,"4",1.7037037037037,2 -"mplexporter",-0.1464208389,2.3064325181,-0.9188944106,"https://salsa.debian.org/python-team/packages/python-mplexporter","https://github.com/mpld3/mplexporter",3220.5932523148,4,24,0,17,29,0,0,31,2,"2",1.85714285714286,1.93548387096774 -"pynacl",0.3194025143,1.5580852197,-0.0692227421,"https://salsa.debian.org/python-team/packages/python-nacl","https://github.com/pyca/pynacl",3948.360462963,44,26,1,61,44,0,0,91,3,"3",1.37142857142857,1.48351648351648 -"python-nameparser",-2.0123667482,0.1499038072,-2.4759914091,"https://salsa.debian.org/python-team/packages/python-nameparser","https://github.com/derek73/python-nameparser",4612.1091203704,9,18,1,23,121,0,0,123,3,"3",1.66666666666667,1.98373983739837 -"nest_asyncio",-3.3220087743,0.2652013224,-4.2429827404,"https://salsa.debian.org/python-team/packages/python-nest-asyncio","https://github.com/erdewit/nest_asyncio",1907.2440740741,4,10,0,12,92,0,0,92,1,"1",1.71428571428571,2 -"python-networkmanager",-0.3294740738,1.4731534732,-0.9543699399,"https://salsa.debian.org/python-team/packages/python-networkmanager","https://github.com/seveas/python-networkmanager",4090.3196759259,12,3,0,11,104,0,0,104,3,"3",1.2,2 -"oauthlib",0.3884344854,2.2364514825,-0.0809544139,"https://salsa.debian.org/python-team/packages/python-oauthlib","https://github.com/oauthlib/oauthlib",4357.2754050926,51,167,2,168,249,0,0,316,3,"3",1.76605504587156,1.7879746835443 -"odfpy",-0.1752613644,1.26653294,-0.4678571818,"https://salsa.debian.org/python-team/packages/python-odf","https://github.com/eea/odfpy",4744.619375,6,27,0,24,129,0,10,140,3,"3",1.81818181818182,1.92142857142857 -"python-pam",0.7194661619,3.5092607756,-0.0318286678,"https://salsa.debian.org/python-team/packages/python-pampy","https://github.com/FirefighterBlu3/python-pam",2926.9394907408,2,10,0,8,42,0,0,42,2,"2",1.83333333333333,2 -"pandocfilters",0.4325771732,2.9731648905,-0.1436774117,"https://salsa.debian.org/python-team/packages/python-pandocfilters","https://github.com/jgm/pandocfilters",2924.0615740741,12,31,0,34,69,0,0,74,2,"2",1.72093023255814,1.93243243243243 -"parameterized",-0.0852476016,1.7634629159,-0.4735189307,"https://salsa.debian.org/python-team/packages/python-parameterized","https://github.com/wolever/parameterized",4033.873125,6,29,0,26,199,0,0,201,3,"3",1.82857142857143,1.99004975124378 -"parse_type",-0.7766894785,2.2657323306,-1.6027471957,"https://salsa.debian.org/python-team/packages/python-parse-type","https://github.com/jenisys/parse_type",3544.3490162037,0,4,0,1,16,0,0,16,2,"2",2,2 -"periodictable",-1.0615188189,0.0399913751,-1.3403053026,"https://salsa.debian.org/science-team/python-periodictable","https://github.com/pkienzle/periodictable.git",5457.176412037,0,18,0,9,27,0,0,27,4,"4",2,2 -"pex",-0.7476267621,1.4651691422,-1.6685430991,"https://salsa.debian.org/python-team/packages/python-pex","https://github.com/pantsbuild/pex.git",3433.3294212963,95,47,0,104,155,0,0,220,2,"2",1.33098591549296,1.70454545454545 -"python-pgpdump",-0.1879378602,2.3259223777,-0.7707539804,"https://salsa.debian.org/python-team/packages/python-pgpdump","https://github.com/toofishes/python-pgpdump",826.806712963,5,2,0,5,24,0,0,24,1,"1",1.28571428571429,2 -"PGPy",-0.2430201905,2.4059068222,-1.197889114,"https://salsa.debian.org/debian/pgpy","https://github.com/SecurityInnovation/PGPy",3246.9911458333,11,33,2,35,91,0,1,103,2,"2",1.75,1.88349514563107 -"pgspecial",0.3830684523,3.0333672127,-0.3897890378,"https://salsa.debian.org/python-team/packages/python-pgspecial","https://github.com/dbcli/pgspecial",2959.9866319445,21,33,0,38,60,0,0,60,2,"2",1.61111111111111,2 -"phply",-0.0136994366,0.8386196269,-0.2146141125,"https://salsa.debian.org/debian/python-phply","https://github.com/viraptor/phply.git",4545.3284143519,2,13,0,9,35,0,0,37,3,"3",1.86666666666667,1.94594594594595 -"picklable-itertools",-1.9017855155,0.0686564891,-2.3399948958,"https://salsa.debian.org/python-team/packages/python-picklable-itertools","https://github.com/mila-iqia/picklable-itertools",176.1980324074,0,5,0,3,4,0,0,4,1,"1",2,2 -"pika",0.6194442951,2.792024793,-0.1295291186,"https://salsa.debian.org/python-team/packages/python-pika","https://github.com/pika/pika",5099.3438078704,52,181,1,165,190,0,0,319,4,"4",1.77682403433476,1.59561128526646 -"pyftpdlib",-0.1028969973,1.6271806139,-0.7069948318,"https://salsa.debian.org/python-team/packages/python-pyftpdlib","https://github.com/giampaolo/pyftpdlib",5695.2602314815,16,22,1,30,82,0,0,100,4,"4",1.57894736842105,1.82 -"pymeasure",-0.0345798255,2.662684469,-0.7066701418,"https://salsa.debian.org/science-team/python-pymeasure","https://github.com/ralph-group/pymeasure/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA -"pynvim",0.1793262124,2.0167259674,-0.2014913603,"https://salsa.debian.org/python-team/packages/python-pynvim","https://github.com/neovim/pynvim",3504.5291782407,26,35,0,55,243,0,0,250,2,"2",1.57377049180328,1.972 -"pyotp",-0.1936486463,2.043929727,-0.7744180298,"https://salsa.debian.org/python-team/packages/python-pyotp","https://github.com/pyauth/pyotp.git",4631.6125462963,26,20,0,33,124,0,0,130,3,"3",1.43478260869565,1.95384615384615 -"pyperclip",0.520944025,2.1523556396,-0.0782247035,"https://salsa.debian.org/sramacher/python-pyperclip","https://github.com/asweigart/pyperclip",3772.0925925926,7,31,0,31,330,0,0,330,3,"3",1.81578947368421,2 -"pyproj",-0.1814047386,0.2461708969,-0.2576178377,"https://salsa.debian.org/debian-gis-team/python-pyproj","https://github.com/pyproj4/pyproj.git",5681.2389236111,30,46,0,61,327,0,0,350,4,"4",1.60526315789474,1.93428571428571 -"pypubsub",-1.763743949,-0.068250645,-2.0677092705,"https://salsa.debian.org/python-team/packages/python-pypubsub","https://github.com/schollii/pypubsub",1788.0433680556,4,5,0,6,42,0,0,42,1,"1",1.55555555555556,2 -"pyramid_multiauth",-1.9341240314,0.3100051717,-2.4480383752,"https://github.com/douardda/pyramid_multiauth","https://github.com/douardda/pyramid_multiauth",1636.4991203704,0,10,0,6,0,0,0,6,1,"1",2,1 -"pysnmp",0.6296288884,1.9466089716,0.0848638325,"https://salsa.debian.org/python-team/packages/python-pysnmp4","https://github.com/etingof/pysnmp",4346.8111226852,17,11,0,21,393,0,0,394,3,"3",1.39285714285714,1.99746192893401 -"qtpy",0.3491974082,2.2294676618,-0.1435114165,"https://salsa.debian.org/python-team/packages/python-qtpy","https://github.com/spyder-ide/qtpy",3201.4270949074,20,62,3,59,61,0,1,101,2,"2",1.75609756097561,1.6039603960396 -"python-quantities",-0.0106025798,1.9580121766,-0.690445939,"https://salsa.debian.org/science-team/python-quantities","https://github.com/python-quantities/python-quantities.git",5020.6635069445,7,39,0,28,134,0,0,135,4,"4",1.84782608695652,1.99259259259259 -"PythonQwt",0.5933841457,3.6301488353,-0.4097779828,"https://salsa.debian.org/science-team/python-qwt","https://github.com/PierreRaybaut/PythonQwt.git",1193.9426967593,2,6,0,5,29,0,0,29,1,"1",1.75,2 -"rarfile",0.2024927767,3.0961464994,-0.5861303229,"https://salsa.debian.org/python-team/packages/python-rarfile","https://github.com/markokr/rarfile.git",5495.9042361111,8,13,0,16,102,0,0,103,4,"4",1.61904761904762,1.99029126213592 -"rdflib-jsonld",-0.0904254945,1.6642685449,-0.4956744476,"https://salsa.debian.org/python-team/packages/python-rdflib-jsonld","https://github.com/RDFLib/rdflib-jsonld",3605.0071180556,4,18,0,13,106,0,0,106,2,"2",1.81818181818182,2 -"readme_renderer",-0.1456681528,2.207631483,-0.5831215172,"https://salsa.debian.org/python-team/packages/python-readme-renderer","https://github.com/pypa/readme_renderer",3479.9030902778,12,22,0,30,133,0,0,141,2,"2",1.64705882352941,1.94326241134752 -"restless",-1.933361243,-0.9031369663,-2.2877460686,"https://salsa.debian.org/python-team/packages/python-restless","https://github.com/toastdriven/restless",2872.2400231482,8,30,0,30,106,0,0,106,2,"2",1.78947368421053,2 -"rply",-0.0320431964,1.7010393246,-0.4724323632,"https://salsa.debian.org/python-team/packages/python-rply","https://github.com/alex/rply",3096.8436689815,9,17,0,21,76,0,0,76,2,"2",1.65384615384615,2 -"python-rsa",0.3772367225,1.9634900436,-0.1098199505,"https://salsa.debian.org/python-team/packages/python-rsa","https://github.com/sybrenstuvel/python-rsa",5670.1946296296,33,16,2,36,126,0,0,139,4,"4",1.3265306122449,1.90647482014388 -"rtree",-0.1090383067,2.131754724,-0.531642492,"https://salsa.debian.org/debian-gis-team/python-rtree","https://github.com/Toblerity/rtree.git",5739.5775925926,25,24,0,39,225,0,1,231,4,"4",1.48979591836735,1.97402597402597 -"s3transfer",0.3673618005,2.5341337999,-0.1810184019,"https://salsa.debian.org/python-team/packages/python-s3transfer","https://github.com/boto/s3transfer",2891.8518634259,24,28,0,32,161,0,0,165,2,"2",1.53846153846154,1.97575757575758 -"sabyenc",0.4522797507,3.6365145505,-0.3981014069,"https://salsa.debian.org/python-team/packages/python-sabyenc","https://github.com/sabnzbd/sabyenc.git",2872.8934606482,9,4,0,8,28,0,0,28,2,"2",1.30769230769231,2 -"scandir",0.8273012672,3.7868324648,0.0056074744,"https://salsa.debian.org/python-team/packages/python-scandir","https://github.com/benhoyt/scandir",3760.0535185185,8,20,0,22,123,0,0,123,2,"2",1.71428571428571,2 -"scrapy-djangoitem",-1.8401324548,0.5412820006,-2.4359072724,"https://salsa.debian.org/python-team/packages/python-scrapy-djangoitem","https://github.com/scrapy-plugins/scrapy-djangoitem",2837.1132523148,0,13,0,10,26,0,0,32,2,"2",2,1.8125 -"scruffy",-0.8950842584,1.9677123819,-1.6884452058,"https://salsa.debian.org/python-team/packages/python-scruffy","https://github.com/snare/scruffy",1665.7056828704,2,5,0,4,9,0,1,10,1,"1",1.71428571428571,1.9 -"secretstorage",0.3387544545,2.1308358714,-0.0585012825,"https://salsa.debian.org/python-team/packages/python-secretstorage","https://github.com/mitya57/secretstorage",3916.1693055556,4,7,0,7,50,0,0,50,3,"3",1.63636363636364,2 -"serverfiles",-3.270914062,-0.0867153,-4.1789525946,"https://salsa.debian.org/python-team/packages/python-serverfiles","https://github.com/biolab/serverfiles",2007.9058333333,1,6,0,6,0,0,0,6,1,"1",1.85714285714286,1 -"setoptconf",-0.6718962402,1.1532142556,-1.127131302,"https://salsa.debian.org/python-team/packages/python-setoptconf","https://github.com/jayclassless/setoptconf.git",2788.0056365741,0,3,0,2,3,0,0,3,2,"2",2,2 -"py-setproctitle",1.0838445468,3.2588810317,0.2442150847,"https://salsa.debian.org/python-team/packages/python-setproctitle","https://github.com/dvarrazzo/py-setproctitle",5054.5442361111,9,10,0,12,86,0,0,89,4,"4",1.52631578947368,1.96629213483146 -"python-sfml",-0.3784249777,0.2624085655,-0.5818259297,"https://salsa.debian.org/games-team/python-sfml","https://github.com/intjelic/python-sfml",3326.0384143519,1,21,2,14,97,0,5,107,2,"2",1.95454545454545,1.90654205607477 -"sh",0.0684316621,2.7449205881,-0.5744266283,"https://salsa.debian.org/python-team/packages/python-sh","https://github.com/amoffat/sh",4327.6361689815,29,75,2,77,438,0,0,456,3,"3",1.72115384615385,1.96052631578947 -"python-slugify",-0.1216991783,1.414032002,-0.4325012299,"https://salsa.debian.org/python-team/packages/python-slugify","https://github.com/un33k/python-slugify",4027.6128240741,29,16,0,32,109,0,0,111,3,"3",1.35555555555556,1.98198198198198 -"socketIO-client",0.9390849724,4.9112952662,-0.4668774995,"https://salsa.debian.org/debian/python-socketio-client","https://github.com/invisibleroads/socketIO-client",1970.3003472222,0,39,2,22,294,0,0,294,1,"1",2,2 -"PySocks",1.0550621894,3.7043852987,0.1526077193,"https://salsa.debian.org/python-team/packages/python-socksipy","https://github.com/Anorov/PySocks",2386.177962963,3,31,0,28,172,0,0,173,1,"1",1.91176470588235,1.99421965317919 -"python-systemd",0.186853671,1.4520714492,-0.0787581662,"https://salsa.debian.org/systemd-team/python-systemd","https://github.com/systemd/python-systemd",3925.6328356482,47,10,0,47,124,0,0,134,3,"3",1.17543859649123,1.92537313432836 -"python-tabulate",0.4140804306,2.807860448,-0.2305820053,"https://salsa.debian.org/python-team/packages/python-tabulate","https://github.com/astanin/python-tabulate.git",3791.7183796296,22,72,0,74,329,0,0,365,3,"3",1.76595744680851,1.9013698630137 -"tasklib",0.0418096657,2.4101943872,-0.7381367832,"https://salsa.debian.org/tasktools-team/python-tasklib","https://github.com/GothenburgBitFactory/tasklib.git",3516.4481481482,7,15,0,12,63,0,0,64,2,"2",1.68181818181818,1.984375 -"tesserocr",-0.0713400087,2.5040315407,-0.9645789788,"https://salsa.debian.org/python-team/packages/python-tesserocr","https://github.com/sirfz/tesserocr.git",2852.5099537037,21,18,0,26,295,0,0,297,2,"2",1.46153846153846,1.99326599326599 -"testfixtures",-1.2559497362,1.6255436778,-1.9966424136,"https://salsa.debian.org/python-team/packages/python-testfixtures","https://github.com/Simplistix/testfixtures",5484.404849537,6,35,0,28,106,0,0,106,4,"4",1.85365853658537,2 -"python-textile",0.3424022956,1.7744319252,-0.1804144888,"https://salsa.debian.org/python-team/packages/python-textile","https://github.com/textile/python-textile.git",3971.2575578704,0,25,0,16,50,0,0,57,3,"3",2,1.87719298245614 -"translationstring",-0.284062414,1.4802740524,-0.7286152652,"https://salsa.debian.org/python-team/packages/python-translationstring","https://github.com/Pylons/translationstring.git",3733.753599537,2,15,0,14,26,0,0,27,2,"2",1.88235294117647,1.96296296296296 -"transliterate",-1.5052976672,1.0843261213,-2.1168561972,"https://salsa.debian.org/python-team/packages/python-transliterate","https://github.com/barseghyanartur/transliterate",3701.1602314815,5,13,0,12,48,0,1,49,2,"2",1.72222222222222,1.97959183673469 -"tzlocal",0.2105199468,2.3487549308,-0.2866926628,"https://salsa.debian.org/python-team/packages/python-tzlocal","https://github.com/regebro/tzlocal",4104.7635185185,12,22,0,27,150,0,0,150,3,"3",1.64705882352941,2 -"python-uinput",-0.4895299649,2.0822444703,-1.2154886237,"https://salsa.debian.org/python-team/packages/python-uinput","https://github.com/tuomasjjrasanen/python-uinput",2471.1649768519,3,17,0,9,71,0,0,76,1,"1",1.85,1.93421052631579 -"python-unicodecsv",0.2177173313,2.0742154186,-0.2503122986,"https://salsa.debian.org/python-team/packages/python-unicodecsv","https://github.com/jdunck/python-unicodecsv",1788.5991550926,0,17,0,12,93,0,0,93,1,"1",2,2 -"uritools",0.5665608671,3.6360712032,-0.2250089468,"https://salsa.debian.org/python-team/packages/python-uritools","https://github.com/tkem/uritools",3490.5498032407,0,3,1,3,16,0,0,16,2,"2",2,2 -"venusian",-0.2389886502,1.4708114679,-0.7217668025,"https://salsa.debian.org/python-team/packages/python-venusian","https://github.com/Pylons/venusian",5042.1797800926,6,25,0,24,62,0,0,62,4,"4",1.80645161290323,2 -"werkzeug",0.6469808555,1.6210316055,0.1636782742,"https://salsa.debian.org/python-team/packages/python-werkzeug","https://github.com/pallets/werkzeug",5778.3072453704,256,251,0,409,438,0,0,737,4,"4",1.49506903353057,1.59430122116689 -"WebSocket-for-Python",-0.3061877909,1.5232020738,-1.0477652346,"https://salsa.debian.org/python-team/packages/python-ws4py","https://github.com/Lawouach/WebSocket-for-Python.git",4476.5480902778,6,66,0,48,280,0,0,280,3,"3",1.91666666666667,2 -"xapian-haystack",-1.109004629,0.9965388597,-1.7612034563,"https://salsa.debian.org/python-team/packages/python-xapian-haystack","https://github.com/notanumber/xapian-haystack",5023.7127662037,14,13,1,15,127,0,4,133,4,"4",1.48148148148148,1.95488721804511 -"pytrainer",-0.1492986337,0.6667449272,-0.6246450089,"https://salsa.debian.org/python-team/packages/pytrainer","https://github.com/pytrainer/pytrainer.git",5724.7457175926,2,26,0,20,59,0,3,64,4,"4",1.92857142857143,1.921875 -"pytsk",-0.0170924765,1.3661578979,-0.4069676209,"https://salsa.debian.org/pkg-security-team/pytsk","https://github.com/py4n6/pytsk.git",4730.6620833333,5,8,0,6,36,0,2,38,3,"3",1.61538461538462,1.94736842105263 -"pyuca",-1.879124707,0.4546058772,-2.3447337433,"https://salsa.debian.org/python-team/packages/pyuca","https://github.com/jtauber/pyuca",2863.4539467593,0,6,0,5,24,0,1,26,2,"2",2,1.92307692307692 -"pyudev",0.3052041709,1.5797390647,-0.0988792966,"https://salsa.debian.org/python-team/packages/pyudev","https://github.com/pyudev/pyudev",4959.3462037037,7,18,0,18,85,0,1,90,3,"3",1.72,1.94444444444444 -"pyutilib",-0.2260212517,1.9708399125,-0.6584040073,"https://salsa.debian.org/python-team/packages/pyutilib","https://github.com/pyutilib/pyutilib",3833.6739467593,5,24,4,10,35,0,0,35,3,"3",1.82758620689655,2 -"pyvirtualdisplay",-0.7443150581,1.4769132038,-1.1764950176,"https://salsa.debian.org/python-team/packages/pyvirtualdisplay","https://github.com/ponty/pyvirtualdisplay.git",4649.3207175926,4,15,0,10,24,0,0,30,3,"3",1.78947368421053,1.8 -"PyWebDAV3",-0.4415298354,0.1562199484,-0.5984518002,"https://salsa.debian.org/tryton-team/pywebdav","https://github.com/andrewleech/PyWebDAV3.git",5191.6373958333,7,13,0,13,12,0,0,21,4,"4",1.65,1.57142857142857 -"pywinrm",1.3688605787,4.5307310299,0.2477962041,"https://salsa.debian.org/python-team/packages/python-winrm","https://github.com/diyan/pywinrm.git",3968.3538425926,2,35,0,22,257,0,0,259,3,"3",1.94594594594595,1.99227799227799 -"pywws",-2.0058814842,0.4297872508,-2.5845945208,"https://salsa.debian.org/debian-iot-team/pywws","https://github.com/jim-easterbrook/pywws",5328.5947916667,7,19,0,21,75,0,0,75,4,"4",1.73076923076923,2 -"pyx",-0.4214323147,0.0635788825,-0.526071945,"https://salsa.debian.org/debian/pyx3","https://github.com/pyx-project/pyx",5502.6121064815,6,10,0,9,36,0,0,36,4,"4",1.625,2 -"pyxid",-1.0618344074,1.7377650499,-1.9813829645,"https://salsa.debian.org/med-team/pyxid","https://github.com/cedrus-opensource/pyxid/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA -"pyxnat",0.8029079218,3.9217278842,-0.2730026627,"https://salsa.debian.org/med-team/pyxnat","https://github.com/pyxnat/pyxnat.git",4754.1324652778,6,37,0,24,63,0,0,65,3,"3",1.86046511627907,1.96923076923077 -"pyyaml",0.295656714,0.9675344795,0.0168556096,"https://salsa.debian.org/python-team/packages/pyyaml","https://github.com/yaml/pyyaml.git",5656.1894444445,35,19,0,38,575,0,2,583,4,"4",1.35185185185185,1.98627787307033 -"qstat",1.4847469863,3.5445875957,0.5684335793,"https://salsa.debian.org/debian/qstat","https://github.com/Unity-Technologies/qstat",4992.716099537,11,11,0,10,43,0,0,43,4,"4",1.5,2 -"QtPass",-0.2443828761,0.6069592093,-0.421666166,"https://salsa.debian.org/debian/qtpass","https://github.com/IJHack/QtPass",3407.0546643519,102,101,0,112,378,0,0,421,2,"2",1.49753694581281,1.8978622327791 -"qtractor",0.2052424785,1.081754113,-0.1776083366,"https://salsa.debian.org/multimedia-team/qtractor","https://github.com/rncbc/qtractor.git",5788.915474537,11,33,0,25,122,0,0,125,4,"4",1.75,1.976 -"qtspell",-1.1174264874,0.8182545984,-1.5529339,"https://salsa.debian.org/qt-kde-team/extras/qtspell","https://github.com/manisandro/qtspell.git",2705.0642476852,0,4,0,3,14,0,1,15,1,"1",2,1.93333333333333 -"quickroute-linux",-0.1342848887,2.9572779507,-1.1039128379,"https://github.com/ralovich/quickroute-linux.git","https://github.com/ralovich/quickroute-linux.git",5000.8862152778,1,8,0,2,9,0,0,9,4,"4",1.88888888888889,2 -"qxgedit",0.0309448749,2.6946289528,-0.6152383196,"https://salsa.debian.org/multimedia-team/qxgedit","https://github.com/rncbc/qxgedit.git",5219.9988078704,1,11,0,3,3,0,0,3,4,"4",1.91666666666667,2 -"qxmpp",-0.5119300912,1.2450413293,-0.9220194723,"https://salsa.debian.org/xmpp-team/qxmpp","https://github.com/qxmpp-project/qxmpp.git",5420.5084722222,31,20,0,35,124,0,4,138,4,"4",1.3921568627451,1.89855072463768 -"AnnotationDbi",0.0182386654,2.4812782442,-0.5700140917,"https://salsa.debian.org/r-pkg-team/r-bioc-annotationdbi","https://github.com/Bioconductor/AnnotationDbi.git",5746.8815509259,1,33,0,12,20,0,0,25,4,"4",1.97058823529412,1.8 -"BiocParallel",-0.3260931785,0.8473313885,-0.5919329079,"https://salsa.debian.org/r-pkg-team/r-bioc-biocparallel","https://github.com/Bioconductor/BiocParallel",3995.750625,8,26,0,20,99,0,2,102,3,"3",1.76470588235294,1.97058823529412 -"Biostrings",-0.3434817294,1.1478032448,-0.6149383263,"https://salsa.debian.org/r-pkg-team/r-bioc-biostrings","https://github.com/Bioconductor/Biostrings.git",5738.5090740741,8,24,0,13,81,0,0,84,4,"4",1.75,1.96428571428571 -"checkmate",0.0859378554,2.3942389138,-0.3501105734,"https://salsa.debian.org/r-pkg-team/r-cran-checkmate","https://github.com/mllg/checkmate.git",3631.5784722222,11,53,0,13,94,0,0,94,2,"2",1.828125,2 -"crosstalk",0.1167413716,2.2666840084,-0.3491412979,"https://salsa.debian.org/r-pkg-team/r-cran-crosstalk","https://github.com/rstudio/crosstalk.git",2973.0628472222,5,12,0,11,160,0,0,160,2,"2",1.70588235294118,2 -"crul",-0.379530865,2.0620312007,-0.8847066541,"https://salsa.debian.org/r-pkg-team/r-cran-crul","https://github.com/ropensci/crul.git",2488.6026967593,12,5,0,14,41,0,0,41,1,"1",1.29411764705882,2 -"eaf",-0.4302337125,1.8302163149,-0.875193303,"https://salsa.debian.org/r-pkg-team/r-cran-eaf","https://github.com/MLopez-Ibanez/eaf/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA -"filehash",0.2805937396,2.9173226699,-0.2488806021,"https://salsa.debian.org/r-pkg-team/r-cran-filehash","https://github.com/rdpeng/filehash/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA -"fs",0.5160636344,3.5162528692,-0.2653989308,"https://salsa.debian.org/r-pkg-team/r-cran-fs","https://github.com/r-lib/fs/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA -"gbm",0.3279916789,3.2242802977,-0.4462694205,"https://salsa.debian.org/r-pkg-team/r-cran-gbm","https://github.com/gbm-developers/gbm/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA -"ggeffects",-0.4101115748,1.6625213011,-0.8467537951,"https://salsa.debian.org/r-pkg-team/r-cran-ggeffects","https://github.com/strengejacke/ggeffects.git",2388.1511805556,6,17,0,11,238,0,0,240,1,"1",1.73913043478261,1.99166666666667 -"gnm",-0.0730492729,2.200175057,-0.5474121482,"https://salsa.debian.org/r-pkg-team/r-cran-gnm","https://github.com/hturner/gnm.git",5664.8181712963,2,3,0,4,13,0,0,14,4,"4",1.6,1.92857142857143 -"gtable",0.3604619903,2.5918478385,-0.180163877,"https://salsa.debian.org/r-pkg-team/r-cran-gtable","https://github.com/r-lib/gtable.git",4252.7226967593,3,15,0,11,32,0,0,32,3,"3",1.83333333333333,2 -"hms",0.2803130949,2.6915633826,-0.2371947898,"https://salsa.debian.org/r-pkg-team/r-cran-hms","https://github.com/tidyverse/hms",2747.6862152778,3,21,1,13,45,0,0,46,2,"2",1.875,1.97826086956522 -"htmlwidgets",0.2223804836,2.4523082161,-0.2245513837,"https://salsa.debian.org/r-pkg-team/r-cran-htmlwidgets","https://github.com/ramnathv/htmlwidgets.git",3428.7835185185,9,25,0,23,280,0,3,283,2,"2",1.73529411764706,1.98939929328622 -"httpuv",0.3875945435,2.2228957646,-0.1562790757,"https://salsa.debian.org/r-pkg-team/r-cran-httpuv","https://github.com/rstudio/httpuv.git",3956.9682986111,10,30,0,24,220,0,0,220,3,"3",1.75,2 -"lmerTestR",-0.2259054579,2.0342017389,-0.6812216469,"https://salsa.debian.org/r-pkg-team/r-cran-lmertest","https://github.com/runehaubo/lmerTestR.git",1009.6075115741,2,4,0,3,48,0,0,48,1,"1",1.66666666666667,2 -"memoise",0.1925230273,2.3898049253,-0.2410666252,"https://salsa.debian.org/r-pkg-team/r-cran-memoise","https://github.com/hadley/memoise.git",1189.1777777778,16,15,0,25,125,0,0,126,1,"1",1.48387096774194,1.99206349206349 -"openssl",0.1408311251,1.9736821031,-0.3054590509,"https://salsa.debian.org/r-pkg-team/r-cran-openssl","https://github.com/jeroen/openssl.git",3340.7487152778,9,9,0,11,104,0,0,105,2,"2",1.5,1.99047619047619 -"repr",-0.4200486236,1.3653979876,-0.7931488934,"https://salsa.debian.org/r-pkg-team/r-cran-repr","https://github.com/IRkernel/repr.git",3009.4312615741,13,11,0,19,107,0,5,113,2,"2",1.45833333333333,1.94690265486726 -"rhandsontable",-0.5116959513,1.6967263903,-0.9527875743,"https://salsa.debian.org/r-pkg-team/r-cran-rhandsontable","https://github.com/jrowen/rhandsontable.git",2472.1080902778,10,16,0,13,398,0,0,399,1,"1",1.61538461538462,1.99749373433584 -"stringr",0.0964776845,1.6534181355,-0.1881647637,"https://salsa.debian.org/r-pkg-team/r-cran-stringr","https://github.com/tidyverse/stringr/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA -"svglite",-0.1885587375,2.5890472118,-0.9181907319,"https://salsa.debian.org/r-pkg-team/r-cran-svglite","https://github.com/r-lib/svglite.git",4029.9752546296,5,22,0,17,93,0,0,94,3,"3",1.81481481481481,1.98936170212766 -"taxize",-0.5524366287,0.9514376137,-0.8175241604,"https://salsa.debian.org/r-pkg-team/r-cran-taxize","https://github.com/ropensci/taxize.git",4557.2839467593,10,50,0,33,204,0,0,205,3,"3",1.83333333333333,1.99512195121951 -"uwot",-2.1360077927,0.1637273439,-2.6156421022,"https://salsa.debian.org/r-pkg-team/r-cran-uwot","https://github.com/jlmelville/uwot.git",2010.5388078704,2,8,0,7,92,0,0,93,1,"1",1.8,1.98924731182796 -"webmockr",-0.4310376105,1.8277386609,-0.9299279762,"https://salsa.debian.org/r-pkg-team/r-cran-webmockr","https://github.com/ropensci/webmockr.git",3289.3273726852,4,4,0,5,17,0,0,18,2,"2",1.5,1.94444444444444 -"rabbitvcs",1.6714946058,3.5426783719,0.7068248862,"https://salsa.debian.org/python-team/packages/rabbitvcs","https://github.com/rabbitvcs/rabbitvcs.git",5506.5331481482,17,45,0,47,171,0,0,202,4,"4",1.7258064516129,1.84653465346535 -"radeontop",0.7905156023,3.9954216105,-0.1328982237,"https://salsa.debian.org/debian/radeontop","https://github.com/clbr/radeontop.git",3881.8500231482,5,20,0,19,110,0,0,114,3,"3",1.8,1.96491228070175 -"radio_beam",0.0745073319,3.00372116,-0.6555904149,"https://salsa.debian.org/debian-astro-team/radio-beam","https://github.com/radio-astro-tools/radio_beam",3526.8169791667,2,17,0,12,23,0,0,24,2,"2",1.89473684210526,1.95833333333333 -"radon",-1.263648812,0.2952439103,-1.5392083653,"https://salsa.debian.org/python-team/packages/radon","https://github.com/rubik/radon.git",4032.6238773148,45,20,0,51,208,0,0,208,3,"3",1.30769230769231,2 -"radsecproxy",-1.2258402548,0.3482737763,-1.8643939562,"https://salsa.debian.org/debian/radsecproxy","https://github.com/radsecproxy/radsecproxy.git",5771.4660069445,15,23,0,18,53,0,0,57,4,"4",1.60526315789474,1.92982456140351 -"nqp",0.9566218472,2.1033155845,0.3242094037,"https://salsa.debian.org/perl6-team/rakudo","https://github.com/Raku/nqp.git",5159.1587847222,24,165,0,111,165,0,3,181,4,"4",1.87301587301587,1.91160220994475 -"raspell",0.0344606053,2.1888191814,-0.7015258119,"https://salsa.debian.org/ruby-team/raspell","https://github.com/evan/raspell/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA -"rasterio",-0.1071898305,2.015565348,-0.6779665658,"https://salsa.debian.org/debian-gis-team/rasterio","https://github.com/rasterio/rasterio.git",3692.9866550926,96,61,0,141,10,0,13,158,2,"2",1.38853503184713,1.06329113924051 -"ratt",-0.4370630128,1.1211106019,-0.8710659773,"https://salsa.debian.org/go-team/packages/ratt","https://github.com/Debian/ratt",2545.9663194445,4,6,0,7,15,0,0,15,1,"1",1.6,2 -"openrdate",0.4382808092,1.3203416533,0.0177798963,"https://salsa.debian.org/debian/rdate","https://github.com/resurrecting-open-source-projects/openrdate",876.4736111111,0,4,0,3,6,0,0,6,1,"1",2,2 -"rdiff-backup",1.0568039762,1.5664048612,0.6904043618,"https://salsa.debian.org/python-team/applications/rdiff-backup","https://github.com/rdiff-backup/rdiff-backup.git",5728.7282407408,45,27,0,46,61,0,0,90,4,"4",1.375,1.67777777777778 -"redis-py-cluster",-1.8001809263,0.773142511,-2.5308098382,"https://salsa.debian.org/python-team/packages/redis-py-cluster","https://github.com/Grokzen/redis-py-cluster",3217.2146527778,55,25,3,58,325,0,0,330,2,"2",1.3125,1.98484848484848 -"r.js",0.307781271,1.8450766211,-0.1061121379,"https://salsa.debian.org/js-team/requirejs","https://github.com/requirejs/r.js.git",4511.8290740741,2,70,0,53,645,0,3,658,3,"3",1.97222222222222,1.98024316109422 -"ripe.atlas.sagan",-0.8350788458,1.3446746037,-1.3262997043,"https://salsa.debian.org/python-team/packages/ripe-atlas-sagan","https://github.com/RIPE-NCC/ripe.atlas.sagan",2585.8181481482,2,22,0,13,17,0,0,19,1,"1",1.91666666666667,1.89473684210526 -"rlwrap",-0.017815457,0.2341200643,-0.1189260094,"https://salsa.debian.org/debian/rlwrap","https://github.com/hanslub42/rlwrap",3317.1894560185,6,18,2,18,111,0,2,113,2,"2",1.75,1.98230088495575 -"rope",1.5978468361,3.9671998177,0.5551935604,"https://salsa.debian.org/python-team/packages/rope","https://github.com/python-rope/rope",5713.8836458333,27,64,1,64,166,0,6,193,4,"4",1.7032967032967,1.860103626943 -"bond_core",-0.4557919444,0.8030863044,-0.7461613445,"https://salsa.debian.org/science-team/ros-bond-core","https://github.com/ros/bond_core",5161.8582291667,13,47,0,19,71,0,0,72,4,"4",1.78333333333333,1.98611111111111 -"genmsg",-0.0171725935,2.3757962259,-0.5825726576,"https://salsa.debian.org/science-team/ros-genmsg","https://github.com/ros/genmsg",4008.1554976852,10,28,1,20,69,0,0,71,3,"3",1.73684210526316,1.97183098591549 -"genpy",-0.6136991201,-0.6108271088,-0.6141657046,"https://salsa.debian.org/science-team/ros-genpy","https://github.com/ros/genpy.git",4178.1003472222,21,31,0,33,89,0,0,91,3,"3",1.59615384615385,1.97802197802198 -"geometry",-0.5506557748,0.4058218051,-0.730025317,"https://salsa.debian.org/science-team/ros-geometry","https://github.com/ros/geometry",5094.8150694445,26,84,1,57,212,0,0,217,4,"4",1.76363636363636,1.97695852534562 -"image_common",-0.4587743218,0.0450984941,-0.6096991982,"https://salsa.debian.org/science-team/ros-image-common","https://github.com/ros-perception/image_common.git",5179.6323611111,38,47,0,28,228,0,2,230,4,"4",1.55294117647059,1.99130434782609 -"interactive_markers",-0.2522280854,2.1257586459,-0.8003900423,"https://salsa.debian.org/science-team/ros-interactive-markers","https://github.com/ros-visualization/interactive_markers.git",5635.5972685185,21,62,0,25,70,0,0,72,4,"4",1.74698795180723,1.97222222222222 -"kdl_parser",-0.3386572847,2.2780300935,-0.9138488719,"https://salsa.debian.org/science-team/ros-kdl-parser","https://github.com/ros/kdl_parser",4840.7517013889,32,70,0,45,47,0,0,80,3,"3",1.68627450980392,1.5875 -"laser_geometry",-0.418947578,0.783831601,-0.6760367366,"https://salsa.debian.org/science-team/ros-laser-geometry","https://github.com/ros-perception/laser_geometry",5200.3426388889,9,44,0,21,63,0,0,65,4,"4",1.83018867924528,1.96923076923077 -"message_runtime",-0.2905975286,1.6300481977,-0.6771923217,"https://salsa.debian.org/science-team/ros-message-runtime","https://github.com/ros/message_runtime.git",2931.9169212963,1,6,0,3,1,0,0,3,2,"2",1.85714285714286,1.33333333333333 -"navigation_msgs",-0.585376458,1.338109234,-0.9801897126,"https://salsa.debian.org/science-team/ros-navigation-msgs","https://github.com/ros-planning/navigation_msgs",4055.7909027778,6,14,0,6,18,0,0,20,3,"3",1.7,1.9 -"nodelet_core",-0.0806493057,2.3062700037,-0.6511678143,"https://salsa.debian.org/science-team/ros-nodelet-core","https://github.com/ros/nodelet_core",4750.0362731482,13,47,1,29,90,0,0,92,3,"3",1.78333333333333,1.97826086956522 -"pluginlib",-0.6634443823,0.7184010327,-0.9470101264,"https://salsa.debian.org/science-team/ros-pluginlib","https://github.com/ros/pluginlib.git",5189.6688194445,29,44,0,22,130,0,0,131,4,"4",1.6027397260274,1.99236641221374 -"vision_opencv",-0.5521042677,0.5682460886,-0.8284518786,"https://salsa.debian.org/science-team/ros-vision-opencv","https://github.com/ros-perception/vision_opencv",5223.1408680556,33,82,0,61,435,0,0,437,4,"4",1.71304347826087,1.9954233409611 -"rss2email",0.3314855505,0.7157681983,0.0455417284,"https://salsa.debian.org/python-team/packages/rss2email","https://github.com/rss2email/rss2email.git",3888.6072916667,25,44,0,51,130,0,0,145,3,"3",1.63768115942029,1.89655172413793 -"actionpack-xml_parser",-0.2996184364,1.3428057072,-0.5955184752,"https://salsa.debian.org/ruby-team/ruby-actionpack-xml-parser","https://github.com/rails/actionpack-xml_parser",1540.6708333333,2,13,0,9,34,0,0,34,1,"1",1.86666666666667,2 -"active_model_serializers",-2.6276778243,-0.1926975438,-3.2592310267,"https://salsa.debian.org/ruby-team/ruby-active-model-serializers","https://github.com/rails-api/active_model_serializers/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA -"activeldap",-1.4156697614,-0.4511022965,-1.5988774793,"https://salsa.debian.org/ruby-team/ruby-activeldap","https://github.com/activeldap/activeldap/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA -"activerecord-import",-1.9687719488,1.0512667089,-2.7168041881,"https://salsa.debian.org/ruby-team/ruby-activerecord-import","https://github.com/zdennis/activerecord-import/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA -"nulldb",-2.9231293508,0.23307279,-3.9919104886,"https://salsa.debian.org/ruby-team/ruby-activerecord-nulldb-adapter","https://github.com/nulldb/nulldb/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA -"acts_as_list",-1.8199662912,-1.4681851633,-1.8707866646,"https://salsa.debian.org/ruby-team/ruby-acts-as-list","https://github.com/swanandp/acts_as_list",4913.7026157407,58,72,1,107,411,0,3,423,3,"3",1.55384615384615,1.97163120567376 -"addressable",0.4108416878,2.8755637332,-0.1685908494,"https://salsa.debian.org/ruby-team/ruby-addressable","https://github.com/sporkmonger/addressable/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA -"ahoy_email",-4.4435950424,-0.9410641928,-5.3641400248,"https://salsa.debian.org/ruby-team/ruby-ahoy-email","https://github.com/ankane/ahoy_email/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA -"amqp",-1.8149935347,0.3288060449,-2.3239990954,"https://salsa.debian.org/ruby-team/ruby-amqp","https://github.com/ruby-amqp/amqp.git",4994.8880787037,18,59,0,41,137,0,0,146,4,"4",1.76623376623377,1.93835616438356 -"api-pagination",-3.3044182875,-0.0567093294,-4.1951110602,"https://salsa.debian.org/ruby-team/ruby-api-pagination","https://github.com/davidcelis/api-pagination.git",3040.7300578704,2,39,0,31,10,0,0,37,2,"2",1.95121951219512,1.27027027027027 -"arbre",-4.8029050341,-2.1273433872,-5.4412019806,"https://salsa.debian.org/ruby-team/ruby-arbre","https://github.com/activeadmin/arbre/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA -"autoprefixer-rails",-0.2315449554,2.8349504609,-1.0454191857,"https://salsa.debian.org/ruby-team/ruby-autoprefixer-rails","https://github.com/ai/autoprefixer-rails/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA -"awesome_print",-0.1589005828,2.0284975516,-0.8426752553,"https://salsa.debian.org/ruby-team/ruby-awesome-print","https://github.com/awesome-print/awesome_print/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA -"backports",0.1539156176,2.1183447847,-0.4562399385,"https://salsa.debian.org/ruby-team/ruby-backports","https://github.com/marcandre/backports/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA -"beaneater",-1.3606359648,1.1630055771,-2.0175948675,"https://salsa.debian.org/ruby-team/ruby-beaneater","https://github.com/beanstalkd/beaneater",3900.0326736111,5,29,1,26,71,0,2,73,3,"3",1.85294117647059,1.97260273972603 -"browser",-0.1660846663,3.3869132145,-1.1464271076,"https://salsa.debian.org/ruby-team/ruby-browser","https://github.com/fnando/browser.git",4214.4159027778,56,56,0,92,148,0,0,210,3,"3",1.5,1.7047619047619 -"clockwork",-1.6175893707,0.2897910827,-2.1048468681,"https://salsa.debian.org/ruby-team/ruby-clockwork","https://github.com/Rykian/clockwork",4663.0759143519,22,47,0,52,93,0,0,126,3,"3",1.68115942028985,1.73809523809524 -"coffee-rails",0.3091824065,2.8142114504,-0.2736133929,"https://salsa.debian.org/ruby-team/ruby-coffee-rails","https://github.com/rails/coffee-rails",3619.3450231482,7,34,0,31,141,0,0,142,2,"2",1.82926829268293,1.99295774647887 -"concurrent-ruby",0.5566030605,2.9441693658,-0.0717542554,"https://salsa.debian.org/ruby-team/ruby-concurrent","https://github.com/ruby-concurrency/concurrent-ruby.git",3789.0811458333,43,132,0,147,281,0,0,329,3,"3",1.75428571428571,1.85410334346505 -"crack",-0.2561449098,2.087316532,-0.8772440851,"https://salsa.debian.org/ruby-team/ruby-crack","https://github.com/jnunemaker/crack",4290.8581481482,10,28,0,32,97,0,0,104,3,"3",1.73684210526316,1.93269230769231 -"cri",-0.2343045243,2.3306711919,-0.7929491714,"https://salsa.debian.org/ruby-team/ruby-cri","https://github.com/ddfreyne/cri",5399.7816666667,2,13,0,10,43,0,0,43,4,"4",1.86666666666667,2 -"curses",0.2397321091,3.7638726076,-0.6627285256,"https://salsa.debian.org/ruby-team/ruby-curses","https://github.com/ruby/curses.git",5368.611724537,1,10,0,23,71,0,0,72,4,"4",1.90909090909091,1.98611111111111 -"dbf",-2.1729354458,-1.1249256758,-2.3569268761,"https://salsa.debian.org/ruby-team/ruby-dbf","https://github.com/infused/dbf/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA -"ruby-dbus",-0.5967981722,1.7453526545,-1.2803486489,"https://salsa.debian.org/ruby-team/ruby-dbus","https://github.com/mvidner/ruby-dbus",4746.8070601852,9,33,0,28,89,0,0,93,3,"3",1.78571428571429,1.95698924731183 -"default_value_for",-0.8448203677,1.505826156,-1.3079220043,"https://salsa.debian.org/ruby-team/ruby-default-value-for","https://github.com/FooBarWidget/default_value_for/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA -"delayed_job",-0.2286424071,2.470279089,-0.9617467357,"https://salsa.debian.org/ruby-team/ruby-delayed-job","http://github.com/collectiveidea/delayed_job/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA -"devise-two-factor",-0.6624262185,1.6467126273,-1.2753154222,"https://salsa.debian.org/ruby-team/ruby-devise-two-factor","https://github.com/tinfoil/devise-two-factor.git",3466.0953935185,20,37,0,43,252,0,0,258,2,"2",1.64912280701754,1.97674418604651 -"diaspora_federation",-4.7376054498,-2.2734066052,-5.4037842301,"https://salsa.debian.org/ruby-team/ruby-diaspora-federation","https://github.com/diaspora/diaspora_federation/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA -"diff-lcs",0.3071796152,2.5635803467,-0.2628240016,"https://salsa.debian.org/ruby-team/ruby-diff-lcs","https://github.com/halostatue/diff-lcs/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA -"diffy",-0.2255220294,2.8131844872,-1.0283299527,"https://salsa.debian.org/ruby-team/ruby-diffy","https://github.com/samg/diffy",4494.6685763889,5,31,0,28,132,0,0,132,3,"3",1.86111111111111,2 -"distribution",-2.1011793074,0.9112617849,-3.0579162724,"https://salsa.debian.org/ruby-team/ruby-distribution","https://github.com/sciruby/distribution/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA -"docker-api",0.2906321596,4.2039401292,-1.0121523475,"https://salsa.debian.org/ruby-team/ruby-docker-api","https://github.com/swipely/docker-api",3249.0699421296,17,99,0,86,233,0,0,256,2,"2",1.85344827586207,1.91015625 -"ruby-domain_name",0.2651495015,2.3454735809,-0.1388653919,"https://salsa.debian.org/ruby-team/ruby-domain-name","https://github.com/knu/ruby-domain_name/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA -"em-synchrony",-2.0598738156,0.4564215093,-2.9786603575,"https://salsa.debian.org/ruby-team/ruby-em-synchrony","https://github.com/igrigorik/em-synchrony",2910.8221180556,2,57,0,41,186,0,1,190,2,"2",1.96610169491525,1.97894736842105 -"factory_girl",-1.4263061364,0.5433633199,-1.9953583847,"https://salsa.debian.org/ruby-team/ruby-factory-girl","https://github.com/thoughtbot/factory_girl.git",4913.9169675926,224,76,0,233,139,0,74,424,3,"3",1.25333333333333,1.32783018867925 -"fakeredis",-3.9027611166,-1.9110018697,-4.3340476978,"https://salsa.debian.org/ruby-team/ruby-fakeredis","https://github.com/guilleiguaran/fakeredis.git",3981.188900463,20,88,0,77,219,0,0,219,3,"3",1.81481481481481,2 -"fakeweb",-2.1455045277,-0.7731874586,-2.5667966225,"https://salsa.debian.org/ruby-team/ruby-fakeweb","https://github.com/chrisk/fakeweb.git",3218.6643865741,6,19,0,19,136,0,0,145,2,"2",1.76,1.93793103448276 -"faraday_middleware",-0.2690476788,2.0619472224,-0.7696905372,"https://salsa.debian.org/ruby-team/ruby-faraday-middleware","https://github.com/lostisland/faraday_middleware",4563.5818981482,47,29,1,58,244,0,14,260,3,"3",1.38157894736842,1.93846153846154 -"fast_gettext",-0.1209401725,1.2360688234,-0.5688307825,"https://salsa.debian.org/ruby-team/ruby-fast-gettext","https://github.com/grosser/fast_gettext",5110.3340046296,3,48,0,29,84,0,4,90,4,"4",1.94117647058824,1.93333333333333 -"fastimage",-0.9259690851,1.7219406128,-1.4847810256,"https://salsa.debian.org/ruby-team/ruby-fastimage","https://github.com/sdsykes/fastimage",5223.7173726852,7,44,0,46,117,0,0,125,4,"4",1.86274509803922,1.936 -"fog-rackspace",-0.4991371264,1.9082417738,-1.1448163084,"https://salsa.debian.org/ruby-team/ruby-fog-rackspace","https://github.com/fog/fog-rackspace",1479.8924537037,3,5,0,4,40,0,0,40,1,"1",1.625,2 -"ruby-fogbugz",-0.712082495,1.9230578337,-1.2759846712,"https://salsa.debian.org/ruby-team/ruby-fogbugz","https://github.com/firmafon/ruby-fogbugz",2091.2249884259,2,11,0,9,16,0,0,16,1,"1",1.84615384615385,2 -"font-awesome-rails",-0.8180755531,0.4347325375,-1.0809960447,"https://salsa.debian.org/ruby-team/ruby-font-awesome-rails","https://github.com/bokmann/font-awesome-rails",4227.7840856482,7,30,0,28,346,0,2,349,3,"3",1.81081081081081,1.99140401146132 -"foreman",-0.8272618131,1.5097537204,-1.3755635236,"https://salsa.debian.org/ruby-team/ruby-foreman","http://github.com/ddollar/foreman/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA -"fssm",-0.4348169171,2.3642288128,-1.1313798455,"https://salsa.debian.org/ruby-team/ruby-fssm","https://github.com/ttilley/fssm.git",2641.9220023148,2,11,0,9,53,0,0,54,1,"1",1.84615384615385,1.98148148148148 -"gelf-rb",-2.0473403812,0.3850902599,-2.7168981677,"https://salsa.debian.org/ruby-team/ruby-gelf","https://github.com/Graylog2/gelf-rb",4546.1701157407,9,25,0,21,141,0,0,142,3,"3",1.73529411764706,1.99295774647887 -"gettext_i18n_rails",-0.7613069529,2.0256293486,-1.5091771924,"https://salsa.debian.org/ruby-team/ruby-gettext-i18n-rails","https://github.com/grosser/gettext_i18n_rails",5235.7802546296,11,59,0,51,141,0,0,144,4,"4",1.84285714285714,1.97916666666667 -"gettext_i18n_rails_js",-0.9612583287,2.4872560383,-1.8785203213,"https://salsa.debian.org/ruby-team/ruby-gettext-i18n-rails-js","https://github.com/webhippie/gettext_i18n_rails_js",4076.9871759259,2,24,0,18,7,0,0,22,3,"3",1.92307692307692,1.31818181818182 -"gettext-setup-gem",-0.5280470276,1.250073738,-0.9596386922,"https://salsa.debian.org/puppet-team/ruby-gettext-setup","https://github.com/puppetlabs/gettext-setup-gem",2424.9263310185,17,20,0,23,43,0,0,44,1,"1",1.54054054054054,1.97727272727273 -"ruby-gir-ffi",-1.5231800876,0.4754387315,-2.1310553218,"https://salsa.debian.org/ruby-team/ruby-gir-ffi","https://github.com/mvz/ruby-gir-ffi",5437.5734375,3,7,0,7,35,0,4,39,4,"4",1.7,1.8974358974359 -"ruby-git",-0.6108616509,1.212287958,-1.0441459189,"https://salsa.debian.org/ruby-team/ruby-git","https://github.com/ruby-git/ruby-git/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA -"ruby-team",-2.3136488279,0.3256391086,-2.9739498003,"https://salsa.debian.org/ruby-team/ruby-github-api","https://salsa.debian.org/ruby-team/ruby-github-api",2392.4012268519,0,6,0,0,0,0,0,0,1,"1",2,NA -"ruby-team",-0.649517699,1.7591556518,-1.1632479129,"https://salsa.debian.org/ruby-team/ruby-github-linguist","https://salsa.debian.org/ruby-team/ruby-github-linguist",3497.9967939815,0,11,0,0,0,0,0,0,2,"2",2,NA -"ruby-team",-1.105143203,0.5312271054,-1.4552026927,"https://salsa.debian.org/ruby-team/ruby-github-markdown","https://salsa.debian.org/ruby-team/ruby-github-markdown",3170.9246875,0,7,0,0,0,0,0,0,2,"2",2,NA -"ruby-team",-0.0402315958,2.2658512207,-0.751462188,"https://salsa.debian.org/ruby-team/ruby-github-markup","https://salsa.debian.org/ruby-team/ruby-github-markup",3514.5048263889,0,15,0,0,0,0,0,0,2,"2",2,NA -"globalid",0.5667944257,3.0518520834,-0.164807865,"https://salsa.debian.org/ruby-team/ruby-globalid","https://github.com/rails/globalid/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA -"guard",-2.9807132483,-1.6178467609,-3.3128126957,"https://salsa.debian.org/ruby-team/ruby-guard","https://github.com/guard/guard.git",4726.434537037,21,191,0,150,537,0,199,776,3,"3",1.90094339622642,1.69201030927835 -"hipchat-rb",-0.6566424992,1.6469892033,-1.2629040655,"https://salsa.debian.org/ruby-team/ruby-hipchat","https://github.com/hipchat/hipchat-rb",2705.747349537,7,102,0,82,222,0,1,227,1,"1",1.93577981651376,1.97797356828194 -"hiredis-rb",-0.8641250548,1.2597163597,-1.3598436427,"https://salsa.debian.org/ruby-team/ruby-hiredis","https://github.com/redis/hiredis-rb.git",4451.3495601852,10,19,0,20,124,0,1,127,3,"3",1.6551724137931,1.97637795275591 -"http.rb",0.5328919596,3.1587146036,-0.5041412503,"https://salsa.debian.org/ruby-team/ruby-http","https://github.com/httprb/http.rb",4428.9060416667,68,68,2,106,42,0,37,169,3,"3",1.5,1.24852071005917 -"jquery-rails",0.4762916242,2.5289403929,-0.1671409996,"https://salsa.debian.org/ruby-team/ruby-jquery-rails","https://github.com/rails/jquery-rails.git",4697.0958680556,14,69,0,65,417,0,1,425,3,"3",1.83132530120482,1.98117647058824 -"jquery-ui-rails",-0.5553100399,1.254748517,-1.1496297544,"https://salsa.debian.org/ruby-team/ruby-jquery-ui-rails","https://github.com/joliss/jquery-ui-rails",4080.9697453704,4,20,0,18,217,0,0,217,3,"3",1.83333333333333,2 -"js-routes",-3.4644388809,-0.4489124279,-4.2577079397,"https://salsa.debian.org/ruby-team/ruby-js-routes","https://github.com/railsware/js-routes",3471.607662037,19,61,0,62,240,0,0,242,2,"2",1.7625,1.99173553719008 -"json-jwt",-0.6646781739,1.8243330124,-1.3376720774,"https://salsa.debian.org/ruby-team/ruby-json-jwt","https://github.com/nov/json-jwt/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA -"json-schema",-2.1030941989,-0.2528356332,-2.4758055487,"https://salsa.debian.org/ruby-team/ruby-json-schema","https://github.com/voxpupuli/json-schema/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA -"json_spec",-2.5962462222,0.2357466454,-3.2697648762,"https://salsa.debian.org/ruby-team/ruby-json-spec","https://github.com/collectiveidea/json_spec",2153.749525463,1,19,0,16,121,0,0,122,1,"1",1.95,1.99180327868852 -"ruby-jwt",-0.0089310607,2.9299158213,-0.7358933013,"https://salsa.debian.org/ruby-team/ruby-jwt","https://github.com/jwt/ruby-jwt/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA -"kakasi_ffi",-3.4351277044,-0.6639963768,-4.2188884559,"https://salsa.debian.org/ruby-team/ruby-kakasi-ffi","https://github.com/knu/kakasi_ffi/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA -"kaminari",-0.5485185975,1.0463989901,-0.9640266374,"https://salsa.debian.org/ruby-team/ruby-kaminari","https://github.com/kaminari/kaminari",4634.2992476852,35,152,3,153,70,0,47,257,3,"3",1.81283422459893,1.27237354085603 -"kitchen-salt",-5.0389266876,-2.9100359531,-5.4788025236,"https://salsa.debian.org/ruby-team/ruby-kitchen-salt","https://github.com/saltstack/kitchen-salt/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA -"kramdown",0.1585424898,1.288591817,-0.1774821194,"https://salsa.debian.org/ruby-team/ruby-kramdown","https://github.com/gettalong/kramdown/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA -"ruby-ldap",0.9723697162,3.8411235557,-0.1487304827,"https://salsa.debian.org/ruby-team/ruby-ldap","https://github.com/bearded/ruby-ldap",3395.5528703704,4,15,0,10,49,0,2,51,2,"2",1.78947368421053,1.96078431372549 -"libxml-ruby",-0.1652439642,1.5527354518,-0.7540442503,"https://salsa.debian.org/ruby-team/ruby-libxml","https://github.com/xml4r/libxml-ruby/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA -"mechanize",-0.3858941786,1.2331276206,-0.8805502233,"https://salsa.debian.org/ruby-team/ruby-mechanize","https://github.com/sparklemotion/mechanize.git",5735.6054513889,5,12,0,103,529,0,6,548,4,"4",1.70588235294118,1.96532846715328 -"moneta",-0.5640132497,0.2515905482,-0.8103956074,"https://salsa.debian.org/ruby-team/ruby-moneta","https://github.com/moneta-rb/moneta",5182.1595023148,20,32,0,38,98,45,0,155,4,"4",1.61538461538462,1.63225806451613 -"msgpack-ruby",0.2893496157,2.7505742261,-0.3169362878,"https://salsa.debian.org/ruby-team/ruby-msgpack","https://github.com/msgpack/msgpack-ruby",4471.1247453704,7,115,0,71,168,0,0,198,3,"3",1.94262295081967,1.84848484848485 -"multi_json",0.6582999616,3.1811345182,-0.0546345167,"https://salsa.debian.org/ruby-team/ruby-multi-json","https://github.com/intridea/multi_json",3679.9527430556,10,44,1,48,209,0,1,218,2,"2",1.81481481481481,1.95871559633028 -"ruby-team",-0.6432733622,1.9225985539,-1.2230466394,"https://salsa.debian.org/ruby-team/ruby-omniauth-github","https://salsa.debian.org/ruby-team/ruby-omniauth-github",3158.4246296296,0,8,0,0,0,0,0,0,2,"2",2,NA -"omniauth-gitlab",-0.8634553119,1.3390999825,-1.29446321,"https://salsa.debian.org/ruby-team/ruby-omniauth-gitlab","https://github.com/linchus/omniauth-gitlab/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA -"omniauth-openid",-2.3993574129,-0.1716426742,-2.9778348021,"https://salsa.debian.org/ruby-team/ruby-omniauth-openid","https://github.com/intridea/omniauth-openid",4671.7113888889,3,19,0,14,49,0,0,57,3,"3",1.86363636363636,1.85964912280702 -"omniauth-saml",-0.5579531725,2.353187853,-1.2497308047,"https://salsa.debian.org/ruby-team/ruby-omniauth-saml","https://github.com/PracticallyGreen/omniauth-saml.git",4118.1158217593,12,46,0,40,204,0,0,207,3,"3",1.79310344827586,1.98550724637681 -"open4",0.0907349731,2.6591042616,-0.4921712465,"https://salsa.debian.org/ruby-team/ruby-open4","https://github.com/ahoward/open4",1740.4206597222,2,8,0,7,38,0,0,40,1,"1",1.8,1.95 -"openid_connect",-1.1502490607,2.0041817142,-2.12720173,"https://salsa.debian.org/ruby-team/ruby-openid-connect","https://github.com/nov/openid_connect",4182.9791435185,0,17,0,9,93,0,3,96,3,"3",2,1.96875 -"packable",-3.0992250392,-0.7077744526,-3.6975414863,"https://salsa.debian.org/ruby-team/ruby-packable","https://github.com/marcandre/packable/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA -"paint",0.0340746752,1.782920882,-0.2850565902,"https://salsa.debian.org/ruby-team/ruby-paint","https://github.com/janlelis/paint.git",4285.910474537,4,14,0,14,30,0,0,31,3,"3",1.77777777777778,1.96774193548387 -"parallel",0.6193238415,3.5398365982,-0.3774990833,"https://salsa.debian.org/ruby-team/ruby-parallel","https://github.com/grosser/parallel/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA -"paranoia",-0.1012866416,3.7176288674,-1.2611069956,"https://salsa.debian.org/ruby-team/ruby-paranoia","https://github.com/rubysherpas/paranoia/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA -"ruby_parser",-0.2008414789,1.500579567,-0.6200732147,"https://salsa.debian.org/ruby-team/ruby-parser","https://github.com/seattlerb/ruby_parser.git",5671.9061921296,0,3,0,2,215,0,0,216,4,"4",2,1.99537037037037 -"pathname2",-0.9624861378,1.7646456748,-1.5703348288,"https://salsa.debian.org/ruby-team/ruby-pathname2","https://github.com/djberg96/pathname2",4825.4280902778,0,6,0,1,5,0,1,6,3,"3",2,1.83333333333333 -"pdf-reader",0.5615735066,2.9676531602,-0.1143510479,"https://salsa.debian.org/ruby-team/ruby-pdf-reader","https://github.com/yob/pdf-reader",5741.4093981482,14,55,0,50,0,0,0,50,4,"4",1.79710144927536,1 -"posix-spawn",0.1309262243,1.6920070582,-0.2475689059,"https://salsa.debian.org/ruby-team/ruby-posix-spawn","https://github.com/rtomayko/posix-spawn",3425.5233101852,3,31,0,26,114,0,0,116,2,"2",1.91176470588235,1.98275862068966 -"rack",0.5237066371,1.7902869998,0.0263794792,"https://salsa.debian.org/ruby-team/ruby-rack","https://github.com/rack/rack",5772.4169444445,210,362,9,391,706,0,76,1026,4,"4",1.63286713286713,1.68810916179337 -"rack-cors",-0.412726661,2.4616028734,-1.1580055428,"https://salsa.debian.org/ruby-team/ruby-rack-cors","https://github.com/cyu/rack-cors",4892.2220601852,37,39,0,61,338,0,0,361,3,"3",1.51315789473684,1.93628808864266 -"punycode.js",0.5843909394,4.0464162194,-0.4662308176,"https://salsa.debian.org/ruby-team/ruby-rails-assets-punycode","https://github.com/bestiejs/punycode.js",4371.2037384259,18,3,0,19,151,0,0,151,3,"3",1.14285714285714,2 -"rails-dom-testing",1.1395257959,2.3186509997,0.452605243,"https://salsa.debian.org/ruby-team/ruby-rails-dom-testing","https://github.com/rails/rails-dom-testing",3596.7865625,8,32,0,32,86,0,0,88,2,"2",1.8,1.97727272727273 -"rails-html-sanitizer",0.0035830645,1.4381559694,-0.2871912749,"https://salsa.debian.org/ruby-team/ruby-rails-html-sanitizer","https://github.com/rails/rails-html-sanitizer",3530.5188078704,6,25,0,27,142,0,0,143,2,"2",1.80645161290323,1.99300699300699 -"rails-i18n",-0.8873907002,1.4792293029,-1.4400451677,"https://salsa.debian.org/ruby-team/ruby-rails-i18n","https://github.com/svenfuchs/rails-i18n/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA -"rainbow",-0.0554541407,2.1809136318,-0.4874876801,"https://salsa.debian.org/ruby-team/ruby-rainbow","https://github.com/sickill/rainbow/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA -"rbnacl",-0.5101798059,1.8184409822,-1.1442616342,"https://salsa.debian.org/ruby-team/ruby-rbnacl","https://github.com/RubyCrypto/rbnacl",3765.2138425926,11,37,2,39,107,0,6,113,2,"2",1.77083333333333,1.94690265486726 -"rbpdf",0.3170747692,3.3087733487,-0.4838111804,"https://salsa.debian.org/ruby-team/ruby-rbpdf","https://github.com/naitoh/rbpdf/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA -"rchardet",0.8898007893,4.3708723994,-0.1239109738,"https://salsa.debian.org/ruby-team/ruby-rchardet","https://github.com/jmhodges/rchardet",5157.8658101852,2,16,0,14,39,0,0,42,4,"4",1.88888888888889,1.92857142857143 -"rdiscount",0.5400773203,2.7137511021,-0.1397503416,"https://salsa.debian.org/ruby-team/ruby-rdiscount","https://github.com/rtomayko/rdiscount",5495.3965277778,14,23,3,28,170,0,9,190,4,"4",1.62162162162162,1.89473684210526 -"re2",-0.3975240745,2.0675577643,-1.080838045,"https://salsa.debian.org/ruby-team/ruby-re2","https://github.com/mudge/re2.git",4891.9840277778,5,6,0,6,31,0,1,32,3,"3",1.54545454545455,1.96875 -"recaptcha",-0.7227524813,1.5115844498,-1.1563133628,"https://salsa.debian.org/ruby-team/ruby-recaptcha","https://github.com/ambethia/recaptcha",5167.5063425926,32,133,0,118,0,0,20,138,4,"4",1.80606060606061,1 -"recursive-open-struct",-0.9586694143,1.8658984093,-1.696474562,"https://salsa.debian.org/ruby-team/ruby-recursive-open-struct","https://github.com/aetherknight/recursive-open-struct/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA -"redcarpet",0.0453332853,0.8616945524,-0.2027621969,"https://salsa.debian.org/ruby-team/ruby-redcarpet","https://github.com/vmg/redcarpet/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA -"redcloth",0.3958422452,2.2802681181,-0.2616585591,"https://salsa.debian.org/ruby-team/ruby-redcloth","https://github.com/jgarber/redcloth.git",5745.4538541667,8,27,0,31,85,0,2,99,4,"4",1.77142857142857,1.85858585858586 -"redis-rb",-0.1845294704,1.6465311996,-0.5725594934,"https://salsa.debian.org/ruby-team/ruby-redis","https://github.com/redis/redis-rb/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA -"redis-actionpack",-0.8365151572,1.4579951576,-1.2916857062,"https://salsa.debian.org/ruby-team/ruby-redis-actionpack","https://github.com/redis-store/redis-actionpack",3755.356412037,8,18,0,15,48,0,0,50,2,"2",1.69230769230769,1.96 -"redis-namespace",-0.5136949026,1.5651978248,-1.007887329,"https://salsa.debian.org/ruby-team/ruby-redis-namespace","https://github.com/resque/redis-namespace",5080.3240046296,46,64,0,90,271,0,0,277,4,"4",1.58181818181818,1.97833935018051 -"ronn-ng",0.0051973803,1.3529280372,-0.5133229589,"https://salsa.debian.org/ruby-team/ruby-ronn","https://github.com/apjanke/ronn-ng",5091.8833101852,3,20,4,19,40,0,0,50,4,"4",1.8695652173913,1.8 -"sass-rails",0.1295459675,2.3430805193,-0.2869628621,"https://salsa.debian.org/ruby-team/ruby-sass-rails","https://github.com/rails/sass-rails",3032.8716550926,10,70,2,62,828,0,0,832,2,"2",1.875,1.99519230769231 -"seed-fu",-0.3406843156,2.6986297961,-1.1723771613,"https://salsa.debian.org/ruby-team/ruby-seed-fu","https://github.com/mbleigh/seed-fu",3639.382974537,1,34,0,23,185,0,4,196,2,"2",1.97142857142857,1.94387755102041 -"select2-rails",0.0255233967,4.0170630036,-1.0829307262,"https://salsa.debian.org/ruby-team/ruby-select2-rails","https://github.com/argerim/select2-rails",3178.7430787037,3,45,0,37,323,0,4,328,2,"2",1.9375,1.98475609756098 -"signet",-0.6999934393,1.7242691265,-1.2316883956,"https://salsa.debian.org/ruby-team/ruby-signet","https://github.com/googleapis/signet",4807.4255671296,28,44,4,52,165,0,1,167,3,"3",1.61111111111111,1.98802395209581 -"sinatra",0.3867492716,1.8300987882,-0.1759543833,"https://salsa.debian.org/ruby-team/ruby-sinatra","https://github.com/sinatra/sinatra.git",5774.2084027778,157,401,0,368,41,0,0,396,4,"4",1.71863799283154,1.10353535353535 -"slack-notifier",-0.2300777475,2.6813920387,-0.9614495819,"https://salsa.debian.org/ruby-team/ruby-slack-notifier","https://github.com/slack-notifier/slack-notifier.git",2800.9713773148,7,25,0,26,174,0,0,175,2,"2",1.78125,1.99428571428571 -"solve",-1.8731536972,0.3722546164,-2.3421355548,"https://salsa.debian.org/ruby-team/ruby-solve","https://github.com/berkshelf/solve",3205.9559722222,4,24,0,17,61,0,0,61,2,"2",1.85714285714286,2 -"sprockets",0.2127696789,2.1502629674,-0.2372190965,"https://salsa.debian.org/ruby-team/ruby-sprockets","https://github.com/rails/sprockets.git",3278.0454050926,50,229,0,213,572,0,0,665,2,"2",1.82078853046595,1.86015037593985 -"stomp",-0.0622865151,2.2785748082,-0.5399267706,"https://salsa.debian.org/ruby-team/ruby-stomp","https://github.com/stompgem/stomp.git",4485.6743055556,3,49,0,31,92,0,4,103,3,"3",1.94230769230769,1.89320388349515 -"svg-graph2",-0.3606208872,1.999901842,-1.0364827172,"https://salsa.debian.org/ruby-team/ruby-svg-graph","https://github.com/lumean/svg-graph2",5000.5990393519,3,24,0,20,18,0,1,29,4,"4",1.88888888888889,1.62068965517241 -"task_list",-0.7972452731,1.5304821718,-1.2730429771,"https://salsa.debian.org/ruby-team/ruby-task-list","https://github.com/deckar01/task_list.git",3500.9144675926,4,16,0,14,10,0,2,22,2,"2",1.8,1.45454545454545 -"test_declarative",-3.1861402959,-0.6802948039,-3.7322816142,"https://salsa.debian.org/ruby-team/ruby-test-declarative","https://github.com/svenfuchs/test_declarative/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA -"test-unit",0.5083159182,3.1187784557,-0.0204072698,"https://salsa.debian.org/ruby-team/ruby-test-unit","https://github.com/test-unit/test-unit/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA -"text",0.3951935457,2.8287836535,-0.1391551665,"https://salsa.debian.org/ruby-team/ruby-text","https://github.com/threedaymonk/text",2533.6334375,0,20,0,9,25,0,0,26,1,"1",2,1.96153846153846 -"thor",0.4898388928,3.0323114244,-0.1082643553,"https://salsa.debian.org/ruby-team/ruby-thor","https://github.com/erikhuda/thor/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA -"thread_safe",0.7899153314,3.4062016312,-0.0364056562,"https://salsa.debian.org/ruby-team/ruby-thread-safe","https://github.com/ruby-concurrency/thread_safe",1914.5871759259,2,18,1,17,28,0,0,34,1,"1",1.9,1.82352941176471 -"timecop",-1.6249475535,-0.136572147,-1.9770285904,"https://salsa.debian.org/ruby-team/ruby-timecop","https://github.com/travisjeffery/timecop/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA -"toml-rb",-1.0965997307,1.7054562066,-1.7254826934,"https://salsa.debian.org/ruby-team/ruby-toml-rb","https://github.com/emancu/toml-rb.git",3791.6442361111,5,30,0,29,61,0,0,61,3,"3",1.85714285714286,2 -"ruby-unf_ext",0.5249786091,2.442343707,-0.0572331883,"https://salsa.debian.org/ruby-team/ruby-unf-ext","https://github.com/knu/ruby-unf_ext",4837.9721180556,5,11,0,11,144,0,0,145,3,"3",1.6875,1.99310344827586 -"validates_url",-1.5783095032,0.6947261226,-2.1729142188,"https://salsa.debian.org/ruby-team/ruby-validate-url","https://github.com/perfectline/validates_url.git",4598.7266782407,25,34,0,47,141,0,0,144,3,"3",1.57627118644068,1.97916666666667 -"vcr",-1.8354081732,0.3458876474,-2.4299770711,"https://salsa.debian.org/ruby-team/ruby-vcr","https://github.com/vcr/vcr",5026.1477083333,86,97,0,152,774,0,33,823,4,"4",1.53005464480874,1.9404617253949 -"xpath",0.2253924511,2.6354082514,-0.4532834945,"https://salsa.debian.org/ruby-team/ruby-xpath","https://github.com/teamcapybara/xpath.git",4699.0999421296,4,29,0,22,77,0,0,77,3,"3",1.87878787878788,2 -"yajl-ruby",0.1342868737,1.2952090225,-0.1984486272,"https://salsa.debian.org/ruby-team/ruby-yajl","https://github.com/brianmario/yajl-ruby",4761.9604282407,20,41,0,45,266,0,0,272,3,"3",1.67213114754098,1.97794117647059 -"yaml_db",-1.6914754372,0.8448802104,-2.2259427821,"https://salsa.debian.org/ruby-team/ruby-yaml-db","https://github.com/yamldb/yaml_db",4943.5546759259,10,17,0,20,191,0,3,198,3,"3",1.62962962962963,1.96464646464646 -"yell",-2.2945770851,0.1365084458,-2.7815318187,"https://salsa.debian.org/ruby-team/ruby-yell","https://github.com/rudionrails/yell",3852.7088541667,5,10,0,12,42,0,5,47,3,"3",1.66666666666667,1.8936170212766 -"rumur",-3.5360734663,-0.8290791088,-4.2689394833,"https://github.com/Smattr/rumur.git","https://github.com/Smattr/rumur.git",3378.9262037037,0,5,0,2,8,0,0,8,2,"2",2,2 -"sagetex",-0.1549904573,0.5108732423,-0.363447528,"https://salsa.debian.org/tex-team/sagetex","https://github.com/dandrake/sagetex/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA -"salmon",-0.3649631387,1.5121758625,-0.9283685843,"https://salsa.debian.org/med-team/salmon","https://github.com/COMBINE-lab/salmon/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA -"samizdat",-2.1436226321,0.0590823844,-2.8619607448,"https://salsa.debian.org/ruby-team/samizdat","https://github.com/angdraug/samizdat",3433.2320138889,0,3,0,1,2,0,0,2,2,"2",2,2 -"samplv1",0.1318819979,2.3880742784,-0.4301804768,"https://salsa.debian.org/multimedia-team/samplv1","https://github.com/rncbc/samplv1.git",4120.8180671296,1,15,0,6,28,0,3,32,3,"3",1.9375,1.875 -"sandsifter",-0.8702992262,1.6152724713,-1.5907539971,"https://salsa.debian.org/pkg-security-team/sandsifter","https://github.com/rigred/sandsifter",736.7519907407,4,12,0,7,12,0,0,15,1,"1",1.75,1.8 -"sasview",-1.0627164618,0.2502972617,-1.4248935984,"https://salsa.debian.org/science-team/sasview","https://github.com/SasView/sasview.git",5783.1973842593,20,119,0,59,30,0,22,86,4,"4",1.85611510791367,1.34883720930233 -"scap-workbench",-0.3629110649,2.6509329851,-1.2724650562,"https://salsa.debian.org/debian/scap-workbench","https://github.com/OpenSCAP/scap-workbench.git",4660.2892824074,13,37,0,20,138,0,7,146,3,"3",1.74,1.94520547945205 -"schismtracker",0.2030503767,1.1666319026,-0.2400483232,"https://salsa.debian.org/multimedia-team/schism","https://github.com/schismtracker/schismtracker",4666.6107291667,15,42,0,31,165,0,6,173,3,"3",1.73684210526316,1.95375722543353 -"coordgenlibs",-0.6657659236,1.5707387755,-1.125402023,"https://salsa.debian.org/science-team/schroedinger-coordgenlibs","https://github.com/schrodinger/coordgenlibs.git",2268.1054282408,12,9,0,14,28,0,0,29,1,"1",1.42857142857143,1.96551724137931 -"scram",0.0112378447,2.4451248274,-0.690432285,"https://salsa.debian.org/science-team/scram","https://github.com/rakhimov/scram.git",1943.5289930556,2,6,0,3,21,0,1,22,1,"1",1.75,1.95454545454545 -"scrcpy",-0.0596273247,2.3700526091,-0.5833876176,"https://salsa.debian.org/yangfl-guest/scrcpy","https://github.com/Genymobile/scrcpy",2194.2825462963,140,11,2,121,680,0,13,788,1,"1",1.07284768211921,1.86294416243655 -"screenFetch",0.8393718554,3.4206935722,0.0064658687,"https://salsa.debian.org/debian/screenfetch","https://github.com/KittyKatt/screenFetch.git",4948.5768518519,38,182,0,141,38,0,5,173,3,"3",1.82727272727273,1.21965317919075 -"screengrab",0.1432641642,1.1078243645,-0.1380237462,"https://salsa.debian.org/lxqt-team/screengrab","https://github.com/lxqt/screengrab.git",4829.5888194445,59,21,0,54,65,0,0,87,3,"3",1.2625,1.74712643678161 -"scrot",0.5207763404,1.4883547353,0.0924816727,"https://salsa.debian.org/debian/scrot","https://github.com/resurrecting-open-source-projects/scrot",1711.9000347222,19,22,0,23,60,0,0,64,1,"1",1.53658536585366,1.9375 -"scrypt",-0.3160075827,1.9170411595,-0.7532305313,"https://salsa.debian.org/debian/scrypt","https://github.com/Tarsnap/scrypt.git",4121.4724652778,3,11,0,10,45,0,0,46,3,"3",1.78571428571429,1.97826086956522 -"sdate",-0.1644092081,1.9663758042,-0.7580677936,"https://github.com/df7cb/sdate","https://github.com/df7cb/sdate",5170.3786689815,3,6,0,6,13,0,0,14,4,"4",1.66666666666667,1.92857142857143 -"seascope",0.1418549141,3.3764775459,-0.9515590832,"https://salsa.debian.org/debian/seascope","https://github.com/anilFree/seascope.git",2921.7499305556,1,15,0,6,6,0,0,7,2,"2",1.9375,1.85714285714286 -"selinux",-1.9466562158,0.7511457525,-2.5791957587,"https://salsa.debian.org/selinux-team/secilc","https://github.com/SELinuxProject/selinux.git",5593.8026157407,179,30,0,124,83,0,12,182,4,"4",1.14354066985646,1.45604395604396 -"THC-Archive",1.9359167993,4.4474577245,0.8251568889,"https://salsa.debian.org/debian/secure-delete","https://github.com/hackerschoice/THC-Archive",1834.166099537,2,3,0,3,7,0,0,8,1,"1",1.6,1.875 -"selinux",0.7649754209,3.3984155889,-0.1297129167,"https://salsa.debian.org/selinux-team/selinux-python","https://github.com/SELinuxProject/selinux.git",5593.8026157407,179,30,0,124,83,0,12,182,4,"4",1.14354066985646,1.45604395604396 -"semi",-0.0012315826,0.7304306594,-0.3636303627,"https://salsa.debian.org/debian/semi","https://github.com/wanderlust/semi",5270.9675347222,3,13,0,9,12,0,0,14,4,"4",1.8125,1.85714285714286 -"sendemail",0.5149987593,2.580274247,-0.1001009863,"https://github.com/mogaal/sendemail","https://github.com/mogaal/sendemail",1084.8616782407,0,2,0,2,42,0,0,43,1,"1",2,1.97674418604651 -"sendxmpp",1.6949802972,3.915419876,0.6723168015,"https://salsa.debian.org/xmpp-team/sendxmpp","https://github.com/lhost/sendxmpp.git",3008.6224768519,2,6,0,3,52,0,0,52,2,"2",1.75,2 -"ser2net",0.6438108629,1.9333620158,-0.0355562238,"https://salsa.debian.org/debian/ser2net","https://github.com/cminyard/ser2net",5671.7052083333,14,9,0,15,113,0,0,117,4,"4",1.39130434782609,1.96581196581197 -"serd",0.7042703147,2.9113947553,0.0669085772,"https://salsa.debian.org/multimedia-team/serd","https://github.com/drobilla/serd.git",4700.7071990741,5,1,0,6,28,0,0,29,3,"3",1.16666666666667,1.96551724137931 -"serverspec-runner",-1.6557747415,0.9321001072,-2.3818100795,"https://salsa.debian.org/ruby-team/serverspec-runner","https://github.com/hiracy/serverspec-runner",3100.2933101852,2,5,0,2,5,0,0,5,2,"2",1.71428571428571,2 -"setBfree",0.0170022664,2.0259314608,-0.4587247273,"https://salsa.debian.org/multimedia-team/setbfree","https://github.com/pantherb/setBfree.git",3675.3818055556,8,6,0,10,61,0,0,61,2,"2",1.42857142857143,2 -"shapelib",0.2832338511,1.1530187147,-0.0270271594,"https://salsa.debian.org/debian-gis-team/shapelib","https://github.com/OSGeo/shapelib.git",5762.8618865741,4,13,0,16,34,0,0,36,4,"4",1.76470588235294,1.94444444444444 -"shellinabox",1.4229551917,3.5460511425,0.4536040301,"https://github.com/shellinabox/shellinabox/","https://github.com/shellinabox/shellinabox",3681.1884027778,7,26,0,21,143,0,3,152,2,"2",1.78787878787879,1.94078947368421 -"shortuuid",-0.4574144902,1.8821725228,-1.1753645345,"https://salsa.debian.org/python-team/packages/shortuuid","https://github.com/skorokithakis/shortuuid.git",4431.3497800926,19,17,0,30,96,0,0,97,3,"3",1.47222222222222,1.98969072164948 -"shotcut",-0.0371835128,1.3895028111,-0.3956647911,"https://salsa.debian.org/multimedia-team/shotcut","https://github.com/mltframework/shotcut",4437.0470486111,40,29,1,54,300,0,0,337,3,"3",1.42028985507246,1.89020771513353 -"should.js",-1.54067697,-0.4927936502,-1.7632687804,"https://salsa.debian.org/js-team/should.js","https://github.com/shouldjs/should.js.git",3267.8598842593,8,77,0,66,165,0,6,211,2,"2",1.90588235294118,1.78199052132701 -"simple-obfs",-0.4921488347,2.3362837337,-1.2782165107,"https://salsa.debian.org/bridges-team/simple-obfs","https://github.com/shadowsocks/simple-obfs.git",958.8196412037,21,12,0,23,215,0,0,217,1,"1",1.36363636363636,1.99078341013825 -"simple-tpm-pk11",-0.6002403517,1.7339981128,-1.3361738434,"https://salsa.debian.org/debian/simple-tpm-pk11","https://github.com/ThomasHabets/simple-tpm-pk11",3536.4266898148,8,13,0,16,52,0,1,53,2,"2",1.61904761904762,1.9811320754717 -"simpleburn",1.1321508597,4.0273397461,0.0153846721,"https://github.com/mati75/simpleburn.git","https://github.com/mati75/simpleburn.git",1916.8323611111,0,3,0,2,4,0,0,5,1,"1",2,1.8 -"simpleeval",-1.0513943081,0.6565241205,-1.3725768937,"https://salsa.debian.org/tryton-team/simpleeval","https://github.com/danthedeckie/simpleeval.git",3363.307037037,10,23,0,21,94,0,0,95,2,"2",1.6969696969697,1.98947368421053 -"simplejson",0.7781612347,2.530704791,0.1122369737,"https://salsa.debian.org/python-team/packages/simplejson","https://github.com/simplejson/simplejson",5762.0850115741,6,42,0,35,85,0,0,111,4,"4",1.875,1.76576576576577 -"ssr",0.5074767944,2.5172653323,-0.0714681759,"https://salsa.debian.org/multimedia-team/simplescreenrecorder","https://github.com/MaartenBaert/ssr",3464.0590972222,13,48,0,42,288,0,1,318,2,"2",1.78688524590164,1.90566037735849 -"simplesnap",-0.3478600805,2.4893157768,-1.2512484875,"https://github.com/jgoerzen/simplesnap","https://github.com/jgoerzen/simplesnap",3116.7912384259,1,6,0,4,24,0,0,24,2,"2",1.85714285714286,2 -"sinntp",-0.7486132539,2.2241911903,-1.864431269,"https://salsa.debian.org/python-team/packages/sinntp","https://github.com/jwilk/sinntp.git",5461.030625,0,2,0,2,3,0,0,4,4,"4",2,1.75 -"skiboot",-1.2267708754,0.8083409101,-1.8023566904,"https://salsa.debian.org/debian/skiboot","https://github.com/open-power/skiboot.git",3435.5121180556,156,19,0,99,117,0,0,167,2,"2",1.10857142857143,1.70059880239521 -"dict",-0.1341965123,0.4940218282,-0.3529875318,"https://salsa.debian.org/debian/skkdic","https://github.com/skk-dev/dict",2069.106724537,1,13,0,14,27,0,0,27,1,"1",1.92857142857143,2 -"skktools",-0.7739115557,-0.492281698,-0.8304382583,"https://salsa.debian.org/debian/skktools","https://github.com/skk-dev/skktools",4603.9943402778,1,14,0,9,15,0,0,15,3,"3",1.93333333333333,2 -"sl",0.323098945,1.3268829075,-0.065447292,"https://salsa.debian.org/debian/sl","https://github.com/mtoyoda/sl",1446.5538657407,0,15,0,10,116,0,0,116,1,"1",2,2 -"sleef",-2.2104947128,0.3306322864,-2.7673859805,"https://salsa.debian.org/science-team/sleef","https://github.com/shibatch/sleef.git",2789.4703935185,24,7,0,30,20,0,2,45,2,"2",1.2258064516129,1.44444444444444 -"sleuthkit",0.248789794,0.7322070572,0.0073823657,"https://salsa.debian.org/pkg-security-team/sleuthkit","https://github.com/sleuthkit/sleuthkit",5541.6815740741,21,144,0,79,39,0,2,97,4,"4",1.87272727272727,1.4020618556701 -"slowhttptest",-0.5285418268,1.6541713882,-0.9836957935,"https://salsa.debian.org/debian/slowhttptest","https://github.com/shekyan/slowhttptest",4436.458900463,5,15,0,11,62,0,3,65,3,"3",1.75,1.95384615384615 -"smarty",0.3504374167,1.5540551587,-0.1505110391,"https://salsa.debian.org/debian/smarty3","https://github.com/smarty-php/smarty.git",3318.9346180556,45,52,0,58,489,0,1,510,2,"2",1.5360824742268,1.95882352941176 -"smbmap",-0.0942111377,1.2729571655,-0.3894550484,"https://salsa.debian.org/pkg-security-team/smbmap","https://github.com/ShawnDEvans/smbmap.git",3137.7212731482,5,16,0,14,95,0,2,99,2,"2",1.76190476190476,1.95959595959596 -"smcroute",-0.5495305171,0.137923259,-0.8122481411,"https://salsa.debian.org/debian/smcroute","https://github.com/troglobit/smcroute.git",5055.7766087963,11,24,0,26,82,0,0,90,4,"4",1.68571428571429,1.91111111111111 -"SmokePing",0.1909583252,0.4951169655,-0.0114998503,"https://salsa.debian.org/debian/smokeping","https://github.com/oetiker/SmokePing.git",5773.8930902778,41,36,0,63,259,0,13,284,4,"4",1.46753246753247,1.91197183098592 -"snap",-0.2880010482,1.7199246286,-0.9244808984,"https://salsa.debian.org/med-team/snap-aligner","https://github.com/amplab/snap.git",3911.3341898148,1,64,0,10,89,0,0,89,3,"3",1.98461538461538,2 -"snimpy",-1.1710720581,-0.3633696382,-1.3515477674,"https://salsa.debian.org/debian/snimpy","https://github.com/vincentbernat/snimpy/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA -"snoopy",1.1669824916,2.8753833581,0.3279585504,"https://salsa.debian.org/pkg-security-team/snoopy","https://github.com/a2o/snoopy",3060.3719097222,6,34,4,21,133,0,0,138,2,"2",1.85,1.96376811594203 -"SoapyHackRF",0.1605098081,2.6673565763,-0.324555585,"https://salsa.debian.org/debian-hamradio-team/soapysdr/soapyhackrf","https://github.com/pothosware/SoapyHackRF.git",2556.4767361111,1,9,0,7,36,0,5,41,1,"1",1.9,1.8780487804878 -"SoapyOsmo",0.1156871694,2.5406057768,-0.3339209238,"https://salsa.debian.org/debian-hamradio-team/soapysdr/soapyosmo","https://github.com/pothosware/SoapyOsmo.git",2779.5272569445,0,2,0,2,14,0,2,16,2,"2",2,1.875 -"SoapySDR",0.5757029294,3.2715487378,-0.2009342982,"https://salsa.debian.org/debian-hamradio-team/soapysdr/soapysdr","https://github.com/pothosware/SoapySDR.git",3219.8508912037,4,27,0,26,135,0,20,166,2,"2",1.87096774193548,1.81325301204819 -"solarpowerlog",-1.7795970498,0.0950109385,-2.3705182782,"https://github.com/coldtobi/solarpowerlog/tree/debian","https://github.com/coldtobi/solarpowerlog",5143.7188310185,1,8,0,1,1,0,1,3,4,"4",1.88888888888889,1.33333333333333 -"solvespace",0.3400078311,2.4750974835,-0.3014099682,"https://salsa.debian.org/science-team/solvespace","https://github.com/solvespace/solvespace/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA -"sombok",0.3006788873,1.8374945588,-0.0607142369,"https://salsa.debian.org/kolter/sombok","https://github.com/hatukanezumi/sombok",1612.4445949074,0,1,0,1,4,0,0,4,1,"1",2,2 -"sonata",0.2905505595,0.9576245442,-0.0885666061,"https://salsa.debian.org/mpd-team/sonata","https://github.com/multani/sonata",4950.7015162037,15,21,0,23,50,0,0,60,3,"3",1.58333333333333,1.83333333333333 -"sonic",0.3436339172,1.4474196373,0.0197565432,"https://salsa.debian.org/a11y-team/sonic","https://github.com/waywardgeek/sonic",4727.1402199074,3,21,0,12,42,0,0,42,3,"3",1.875,2 -"sope",-0.250285844,0.9987661956,-0.7280518867,"https://salsa.debian.org/debian/sope","https://github.com/inverse-inc/sope.git",4884.8710648148,9,32,0,24,32,0,0,35,3,"3",1.78048780487805,1.91428571428571 -"soundkonverter",1.0908472726,2.4748241992,0.3743578972,"https://salsa.debian.org/qt-kde-team/extras/soundkonverter","https://github.com/dfaust/soundkonverter.git",4518.0852893519,5,14,0,15,97,0,5,103,3,"3",1.73684210526316,1.94174757281553 -"spectrwm",0.8740320474,3.3995660037,-0.1106287738,"https://salsa.debian.org/debian/spectrwm","https://github.com/conformal/spectrwm",5428.7537962963,35,24,0,38,333,0,14,353,4,"4",1.40677966101695,1.94334277620397 -"sphinxcontrib-bibtex",0.111160598,2.1131827213,-0.4197298069,"https://salsa.debian.org/science-team/sphinxcontrib-bibtex","https://github.com/mcmtroffaes/sphinxcontrib-bibtex.git",4544.6493055556,11,9,0,16,150,0,0,150,3,"3",1.45,2 -"restbuilder",-1.1764165162,1.2846690356,-1.6755940115,"https://salsa.debian.org/python-team/packages/sphinxcontrib-restbuilder","https://github.com/sphinx-contrib/restbuilder.git",2987.8306828704,1,10,0,8,23,0,0,25,2,"2",1.90909090909091,1.92 -"spelling",-0.7874116783,1.0287481645,-1.4199296239,"https://salsa.debian.org/python-team/packages/sphinxcontrib-spelling","https://github.com/sphinx-contrib/spelling",5270.8333333333,12,76,0,67,83,0,0,120,4,"4",1.86363636363636,1.69166666666667 -"sphinxcontrib-websupport",-1.489015386,0.092912366,-1.8959476069,"https://salsa.debian.org/python-team/packages/sphinxcontrib-websupport","https://github.com/sphinx-doc/sphinxcontrib-websupport",4818.6938425926,8,17,0,18,21,0,0,29,3,"3",1.68,1.72413793103448 -"sphinxtesters",-1.0316070726,1.4478444724,-1.604600739,"https://salsa.debian.org/python-team/packages/sphinxtesters","https://github.com/matthew-brett/sphinxtesters.git",2155.7952314815,0,3,0,2,5,0,0,5,1,"1",2,2 -"spin-debian",-0.5307239904,2.5263569152,-1.4016281412,"https://github.com/thomaslee/spin-debian","https://github.com/thomaslee/spin-debian",1934.3454282407,2,4,0,2,3,0,0,3,1,"1",1.66666666666667,2 -"sqitch",-1.0987496818,-0.3717057014,-1.2899258645,"https://salsa.debian.org/perl-team/modules/packages/sqitch","https://github.com/sqitchers/sqitch/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA -"sqldeveloper-package",0.3178462622,2.5512521122,-0.5498064554,"https://github.com/lazarusllong/sqldeveloper-package.git","https://github.com/lazarusllong/sqldeveloper-package.git",2130.3049189815,0,3,0,1,6,0,0,6,1,"1",2,2 -"sqlgrey-debian",-0.447394697,1.287594037,-1.0928861268,"https://github.com/bobek/sqlgrey-debian","https://github.com/bobek/sqlgrey-debian",4172.3835300926,1,3,0,2,1,0,0,2,3,"3",1.75,1.5 -"sqlmap",-0.0436656036,1.2298763794,-0.4076774194,"https://salsa.debian.org/pkg-security-team/sqlmap","https://github.com/sqlmapproject/sqlmap.git",5537.8440625,75,67,0,118,120,0,6,236,4,"4",1.47183098591549,1.50847457627119 -"ssh-audit",0.2128051096,2.7100037355,-0.3787946632,"https://salsa.debian.org/debian/ssh-audit","https://github.com/jtesta/ssh-audit.git",2897.0719328704,19,7,0,23,122,0,13,141,2,"2",1.26923076923077,1.86524822695035 -"sshuttle",0.4686212873,1.5902040128,-0.0562158764,"https://salsa.debian.org/debian/sshuttle","https://github.com/sshuttle/sshuttle.git",4975.0844675926,104,46,0,119,319,0,1,380,3,"3",1.30666666666667,1.83947368421053 -"sslsplit",0.0482855639,2.1228996274,-0.6371278291,"https://salsa.debian.org/debian/sslsplit","https://github.com/droe/sslsplit",4093.9351851852,9,20,2,17,164,0,0,170,3,"3",1.68965517241379,1.96470588235294 -"subliminal",0.7190070506,3.1421902787,-0.2079240806,"https://salsa.debian.org/python-team/packages/subliminal","https://github.com/Diaoul/subliminal.git",3790.6726273148,11,36,0,30,562,0,0,566,3,"3",1.76595744680851,1.99293286219081 -"suds",-0.2061376952,0.1335002243,-0.2803381261,"https://salsa.debian.org/python-team/packages/suds","https://github.com/suds-community/suds.git",3431.6421990741,14,23,0,26,80,0,0,87,2,"2",1.62162162162162,1.91954022988506 -"sundials",0.1304834937,1.329515137,-0.4214324267,"https://salsa.debian.org/science-team/sundials","https://github.com/LLNL/sundials.git",5750.416412037,17,59,0,19,126,0,1,131,4,"4",1.77631578947368,1.9618320610687 -"sup",0.7289408703,1.645644064,0.2014294659,"https://salsa.debian.org/ruby-team/sup-mail","https://github.com/sup-heliotrope/sup/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA -"svgpp",-1.8854559409,-0.5385173138,-2.2188275477,"https://salsa.debian.org/debian/svgpp","https://github.com/svgpp/svgpp.git",3480.6248726852,6,8,0,8,55,0,1,56,2,"2",1.57142857142857,1.98214285714286 -"svgtune",0.1366019906,2.760378779,-0.708785107,"http://github.com/yarikoptic/svgtune","http://github.com/yarikoptic/svgtune",4268.4841550926,0,2,0,0,0,0,0,0,3,"3",2,NA -"svgwrite",0.1630015143,2.8978314663,-0.6431657526,"https://salsa.debian.org/python-team/packages/svgwrite","https://github.com/mozman/svgwrite.git",2562.4058912037,4,22,0,19,110,0,0,115,1,"1",1.84615384615385,1.95652173913043 -"svn2git",0.0735704043,2.214779927,-0.6989156967,"https://salsa.debian.org/debian/svn-all-fast-export","https://github.com/svn-all-fast-export/svn2git.git",5311.2481365741,28,29,0,32,96,0,0,107,4,"4",1.50877192982456,1.89719626168224 -"svtplay-dl",-0.259583484,1.4909319758,-0.7330050577,"https://salsa.debian.org/olof/svtplay-dl","https://github.com/spaam/svtplay-dl",4669.1490162037,48,26,3,52,53,0,0,92,3,"3",1.35135135135135,1.57608695652174 -"svxlink",-0.3635018341,1.3160115906,-0.862809513,"https://salsa.debian.org/debian-hamradio-team/svxlink","https://github.com/sm0svx/svxlink/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA -"swaks",-0.0249524642,0.3218579009,-0.1486439733,"https://salsa.debian.org/debian/swaks","https://github.com/jetmore/swaks",5448.0600694445,0,9,5,5,49,0,0,49,4,"4",2,2 -"swami",0.1476526288,1.5183148814,-0.4624982263,"https://salsa.debian.org/multimedia-team/swami","https://github.com/swami/swami",4547.4787962963,6,10,0,8,16,0,0,19,3,"3",1.625,1.84210526315789 -"swauth",-2.4254901848,-0.8570793139,-2.7795442667,"https://salsa.debian.org/openstack-team/services/swauth","https://github.com/openstack/swauth.git",3045.1673958333,5,41,0,20,0,0,0,20,2,"2",1.89130434782609,1 -"swayidle",-0.101420118,2.2036420089,-0.6198513899,"https://salsa.debian.org/swaywm-team/swayidle","https://github.com/swaywm/swayidle",1867.500775463,24,22,0,36,149,0,0,156,1,"1",1.47826086956522,1.9551282051282 -"swift",-0.7448605494,-0.5081147887,-0.8497485173,"https://salsa.debian.org/openstack-team/services/swift","https://github.com/openstack/swift.git",4902.7891898148,50,447,0,293,35,0,0,321,3,"3",1.89939637826962,1.10903426791277 -"synaptic",4.0786320856,4.6212205168,3.6414737103,"https://github.com/mvo5/synaptic","https://github.com/mvo5/synaptic",5665.1249768519,20,60,0,45,96,0,2,108,4,"4",1.75,1.88888888888889 -"tappy",-0.7057840569,2.2385171659,-1.5015511284,"https://salsa.debian.org/python-team/packages/tap.py","https://github.com/python-tap/tappy",3537.627025463,10,7,0,13,34,0,0,34,2,"2",1.41176470588235,2 -"tcpflow",0.1993321539,0.7688453693,-0.0915379508,"https://salsa.debian.org/debian/tcpflow","https://github.com/simsong/tcpflow.git",4133.2346875,26,36,0,41,169,0,0,171,3,"3",1.58064516129032,1.98830409356725 -"tcpslice",0.3358455905,2.6360959654,-0.570915695,"https://salsa.debian.org/debian/tcpslice","https://github.com/the-tcpdump-group/tcpslice",1218.7178356482,4,7,0,9,17,0,0,18,1,"1",1.63636363636364,1.94444444444444 -"tdc",-0.5860347644,1.7220497679,-1.1918576951,"https://github.com/MTecknology/tdc","https://github.com/MTecknology/tdc",2078.2080208333,1,4,0,1,3,0,0,3,1,"1",1.8,2 -"tdiary-contrib",-1.4993548568,-0.3330069572,-2.0474169755,"https://salsa.debian.org/ruby-team/tdiary-contrib","https://github.com/tdiary/tdiary-contrib",5617.5064699074,4,81,0,39,47,0,0,49,4,"4",1.95294117647059,1.95918367346939 -"tdiary-style-gfm",-3.85195761,-1.6209873018,-4.3352117054,"https://salsa.debian.org/ruby-team/tdiary-style-gfm","https://github.com/tdiary/tdiary-style-gfm",3042.2103356482,2,13,0,10,14,0,0,14,2,"2",1.86666666666667,2 -"tea-qt",-0.2810310835,0.1682947168,-0.470037759,"https://salsa.debian.org/debian/tea","https://github.com/psemiletov/tea-qt.git",2860.1480092593,4,9,0,7,18,0,1,21,2,"2",1.69230769230769,1.85714285714286 -"teckit",2.1261637138,6.076788803,0.7450555927,"https://github.com/debian-tex/teckit","https://github.com/debian-tex/teckit",2563.6115277778,1,6,0,2,1,0,0,3,1,"1",1.85714285714286,1.33333333333333 -"tegaki",1.3618120507,5.4067459557,0.1410792866,"https://salsa.debian.org/debian/tegaki-zinnia-japanese","https://github.com/tegaki/tegaki.git",5118.3927777778,1,17,0,7,18,0,0,21,4,"4",1.94444444444444,1.85714285714286 -"terminado",0.1170410576,1.292034871,-0.1639482973,"https://salsa.debian.org/python-team/packages/terminado","https://github.com/jupyter/terminado",3771.3957407407,25,31,0,38,96,0,0,101,3,"3",1.55357142857143,1.95049504950495 -"termshark",-0.7902341917,1.4608630566,-1.2282898458,"https://salsa.debian.org/go-team/packages/termshark","https://github.com/gcla/termshark.git",1476.2094328704,6,14,0,14,67,0,0,72,1,"1",1.7,1.93055555555556 -"tifffile",-0.4950191398,1.0954022518,-0.9432954038,"https://salsa.debian.org/python-team/packages/tifffile","https://github.com/cgohlke/tifffile.git",1876.5951851852,0,2,0,1,107,0,0,107,1,"1",2,2 -"tigervnc",0.3860499518,0.9771386342,0.0684855341,"https://salsa.debian.org/debian-remote-team/tigervnc","https://github.com/TigerVNC/tigervnc.git",5713.2161226852,57,92,0,111,563,0,20,660,4,"4",1.61744966442953,1.8530303030303 -"tikzit",-0.3160832668,1.7178404043,-0.77589652,"https://salsa.debian.org/debian/tikzit","https://github.com/tikzit/tikzit.git",4273.8409027778,1,14,0,8,114,0,0,115,3,"3",1.93333333333333,1.99130434782609 -"tiledarray",-1.7374267908,0.1767686338,-2.351826242,"https://salsa.debian.org/debichem-team/tiledarray","https://github.com/ValeevGroup/tiledarray.git",5618.1119675926,7,39,0,21,38,0,5,43,4,"4",1.84782608695652,1.88372093023256 -"tktable",0.3811226337,2.9724908262,-0.2247277525,"https://salsa.debian.org/tcltk-team/tk-table","https://github.com/wjoye/tktable",2301.1677546296,2,6,0,3,5,0,0,5,1,"1",1.75,2 -"python-tldp",-2.9387752686,-1.0847198188,-3.3226946918,"https://github.com/tLDP/python-tldp","https://github.com/tLDP/python-tldp",2447.0141319445,0,4,0,2,4,0,0,4,1,"1",2,2 -"tldr.py",-0.8494191178,1.5859020327,-1.3735854961,"https://salsa.debian.org/python-team/packages/tldr-py","https://github.com/lord63/tldr.py",1740.1593055556,4,6,0,6,33,0,0,33,1,"1",1.6,2 -"tlf",-0.8747316419,-0.5145883819,-0.9886468624,"https://salsa.debian.org/debian-hamradio-team/tlf","https://github.com/Tlf/tlf.git",5111.2798263889,15,21,0,19,45,0,2,47,4,"4",1.58333333333333,1.95744680851064 -"tootle",1.2711208148,4.7692261317,-0.0231156554,"https://salsa.debian.org/debian/tootle","https://github.com/bleakgrey/tootle.git",1706.1450925926,21,13,0,23,214,0,0,214,1,"1",1.38235294117647,2 -"torbrowser-launcher",0.2254493944,0.4690081374,0.0615930109,"https://salsa.debian.org/pkg-privacy-team/torbrowser-launcher","https://github.com/micahflee/torbrowser-launcher",3941.4624421296,20,66,6,66,20,0,1,80,3,"3",1.76744186046512,1.25 -"toro",-2.2006489719,0.2918073361,-2.7668191631,"https://salsa.debian.org/debian/toro","https://github.com/ajdavis/toro/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA -"totalopenstation",-0.3889221766,1.015672648,-0.7332210243,"https://salsa.debian.org/debian-gis-team/totalopenstation","https://github.com/totalopenstation/totalopenstation.git",3856.5791319445,6,8,0,10,14,0,0,20,3,"3",1.57142857142857,1.7 -"traitlets",0.2529500243,1.8629238208,-0.0962338622,"https://salsa.debian.org/python-team/packages/traitlets","https://github.com/ipython/traitlets.git",5659.0350347222,36,89,0,97,252,0,0,265,4,"4",1.712,1.95094339622642 -"twolame",0.8417112782,2.6067569755,0.181912311,"https://salsa.debian.org/multimedia-team/twolame","https://github.com/njh/twolame",5003.7664467593,10,10,2,13,33,0,0,33,4,"4",1.5,2 -"txt2html",0.7774259234,2.1221283602,0.106308761,"https://salsa.debian.org/debian/txt2html","https://github.com/resurrecting-open-source-projects/txt2html",5316.6490856482,1,4,0,2,4,0,0,4,4,"4",1.8,2 -"txt2man",0.4090645621,1.519569464,-0.1442456476,"https://salsa.debian.org/debian/txt2man","https://github.com/mvertes/txt2man",2424.6791435185,2,9,0,9,19,0,0,19,1,"1",1.81818181818182,2 -"txt2tags",0.0507302842,1.0615675266,-0.3853719858,"https://salsa.debian.org/python-team/packages/txt2tags","https://github.com/txt2tags/txt2tags.git",5549.6046296296,9,22,0,3,36,0,1,37,4,"4",1.70967741935484,1.97297297297297 -"txWS",-1.4288081047,1.2079142338,-2.0336181053,"https://salsa.debian.org/python-team/packages/txws","https://github.com/MostAwesomeDude/txWS",4288.2085763889,2,10,0,9,37,0,0,37,3,"3",1.83333333333333,2 -"txZMQ",-0.6021876626,0.9002822086,-1.0188293115,"https://salsa.debian.org/python-team/packages/txzmq","https://github.com/smira/txZMQ",3989.2474074074,3,25,0,17,61,0,0,62,3,"3",1.89285714285714,1.98387096774194 -"typogrify",-0.5841407904,1.9099456866,-1.1786502144,"https://salsa.debian.org/python-team/packages/typogrify","https://github.com/mintchaos/typogrify",4964.5992708333,2,13,0,12,50,0,0,50,3,"3",1.86666666666667,2 -"u-msgpack-python",0.71036009,3.6137824666,-0.1082167429,"https://salsa.debian.org/python-team/packages/u-msgpack-python","https://github.com/vsergeev/u-msgpack-python",3518.0095949074,11,3,1,10,40,0,0,40,2,"2",1.21428571428571,2 -"uap-core",-1.4950577768,0.2195779264,-1.9007872982,"https://salsa.debian.org/debian/uap-core","https://github.com/ua-parser/uap-core.git",3378.7186458333,35,224,0,172,383,0,0,428,2,"2",1.86486486486486,1.89485981308411 -"udisks",1.637930268,2.6755087394,1.0040393895,"https://salsa.debian.org/utopia-team/udisks2","https://github.com/storaged-project/udisks",5742.1701388889,64,76,1,109,96,0,1,178,4,"4",1.54285714285714,1.53932584269663 -"ufo2otf-debian",-1.1799643582,1.8587549116,-1.9214944844,"https://github.com/Rudloff/ufo2otf-debian","https://github.com/Rudloff/ufo2otf-debian",893.8441666667,1,3,0,3,1,0,0,3,1,"1",1.75,1.33333333333333 -"UglifyJS2",-0.4631278916,1.3138425047,-0.9110194583,"https://salsa.debian.org/js-team/uglifyjs","https://github.com/mishoo/UglifyJS2",3886.0955208333,82,71,0,115,88,0,0,192,3,"3",1.4640522875817,1.45833333333333 -"UglifyJS2",1.1390181603,3.3421341091,0.221625202,"https://salsa.debian.org/js-team/uglifyjs","https://github.com/mishoo/UglifyJS2",3886.0955208333,82,71,0,115,88,0,0,192,3,"3",1.4640522875817,1.45833333333333 -"ukui-sidebar",-3.8890227903,-1.5419346693,-4.3399549698,"https://github.com/ukui/ukui-sidebar","https://github.com/ukui/ukui-sidebar",770.8421412037,16,52,0,28,0,0,0,28,1,"1",1.76470588235294,1 -"unshield",1.079201816,2.9040511207,0.2466958012,"https://salsa.debian.org/games-team/unshield","https://github.com/twogood/unshield.git",5774.0918055556,2,32,0,28,33,0,0,49,4,"4",1.94117647058824,1.6734693877551 -"Unworkable",-0.495607915,1.1078529483,-1.0387863531,"https://salsa.debian.org/debian/unworkable","https://github.com/niallo/Unworkable.git",3168.162650463,2,5,0,2,2,0,0,3,2,"2",1.71428571428571,1.66666666666667 -"usbauth-all",-0.84864584,2.3248338051,-1.5774396132,"https://salsa.debian.org/debian/usbauth","https://github.com/kochstefan/usbauth-all.git",2917.2837384259,3,5,0,2,7,0,0,7,2,"2",1.625,2 -"usbauth-all",-1.3618380248,0.1189121883,-1.684268531,"https://salsa.debian.org/debian/usbauth-notifier","https://github.com/kochstefan/usbauth-all.git",2917.2837384259,3,5,0,2,7,0,0,7,2,"2",1.625,2 -"usbguard",-0.21450453,0.5691395227,-0.5636553493,"https://salsa.debian.org/birger/usbguard","https://github.com/dkopecek/usbguard",3141.3933796296,33,38,1,43,150,0,1,161,2,"2",1.53521126760563,1.93167701863354 -"usbmuxd",1.7018106669,3.399620343,0.8385492974,"https://salsa.debian.org/imobiledevice-team/usbmuxd","https://github.com/libimobiledevice/usbmuxd",5280.2443287037,27,16,0,24,138,0,1,149,4,"4",1.37209302325581,1.9261744966443 -"usbview",0.2830288966,1.2165170826,-0.0945146744,"https://salsa.debian.org/debian/usbview","https://github.com/gregkh/usbview.git",5596.9732407408,7,11,0,12,12,0,0,21,4,"4",1.61111111111111,1.57142857142857 -"uvloop",-0.4097803455,1.6193553491,-1.0751849943,"https://salsa.debian.org/python-team/packages/uvloop","https://github.com/MagicStack/uvloop",2912.1617939815,58,10,0,57,542,0,1,543,2,"2",1.14705882352941,1.99815837937385 -"v4l2loopback",-0.1197314674,0.4069152495,-0.2587985427,"https://salsa.debian.org/debian/v4l2loopback","https://github.com/umlaeute/v4l2loopback.git",5406.2159953704,26,63,0,57,94,0,35,176,4,"4",1.70786516853933,1.53409090909091 -"vagrant-libvirt",-0.1221442454,0.3185253091,-0.2416538921,"https://salsa.debian.org/ruby-team/vagrant-libvirt","https://github.com/vagrant-libvirt/vagrant-libvirt",3827.3451388889,87,210,0,209,98,0,3,280,3,"3",1.70707070707071,1.35 -"vagrant-lxc",0.8034556285,4.6021026989,-0.412211374,"https://salsa.debian.org/ruby-team/vagrant-lxc","https://github.com/fgrehm/vagrant-lxc",3559.775474537,9,55,2,46,129,0,31,186,2,"2",1.859375,1.69354838709677 -"vagrant-mutate",-0.4801401485,1.7149444538,-0.9074989115,"https://salsa.debian.org/ruby-team/vagrant-mutate","https://github.com/sciurus/vagrant-mutate",1407.9479166667,3,15,4,15,61,0,1,62,1,"1",1.83333333333333,1.98387096774194 -"vagrant-sshfs",-0.3177714786,2.0839099019,-0.8418425788,"https://salsa.debian.org/ruby-team/vagrant-sshfs","https://github.com/dustymabe/vagrant-sshfs",2305.1928472222,2,14,0,15,132,0,0,132,1,"1",1.875,2 -"vcsh",1.141131609,4.2673996711,0.0261319499,"https://github.com/RichiH/vcsh","https://github.com/RichiH/vcsh",4529.0101851852,11,57,0,53,153,63,2,223,3,"3",1.83823529411765,1.68609865470852 -"VOoM",-0.4785805602,0.6126802722,-0.659254773,"https://salsa.debian.org/yyabuki/vim-voom","https://github.com/vim-voom/VOoM.git",1193.9262731482,0,1,0,1,20,0,0,20,1,"1",2,2 -"virtualjaguar-debian",-0.3323824959,1.6186130413,-0.7674058951,"https://github.com/glaubitz/virtualjaguar-debian","https://github.com/glaubitz/virtualjaguar-debian",1293.0757291667,2,1,0,1,1,0,0,2,1,"1",1.33333333333333,1.5 -"vmtouch",0.0085288392,3.0675234726,-0.8067347383,"https://salsa.debian.org/debian/vmtouch","https://github.com/hoytech/vmtouch",4266.5434837963,8,25,0,21,85,0,0,86,3,"3",1.75757575757576,1.98837209302326 -"voctomix",-0.3727468412,1.1810950571,-0.6494603735,"https://salsa.debian.org/debian/voctomix","https://github.com/voc/voctomix.git",3329.1224189815,7,54,0,35,80,0,5,86,2,"2",1.88524590163934,1.93023255813953 -"voctomix-outcasts",-1.6893130475,-1.2420509413,-1.7699634447,"https://salsa.debian.org/debian/voctomix-outcasts","https://github.com/CarlFK/voctomix-outcasts.git",2648.5362847222,0,9,0,6,7,0,0,7,1,"1",2,2 -"vokoscreenNG",0.2104121096,1.2955691942,-0.1531712498,"https://salsa.debian.org/debian/vokoscreen-ng","https://github.com/vkohaupt/vokoscreenNG/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA -"volk",0.3490308455,1.9477412745,-0.157883478,"https://salsa.debian.org/bottoms/pkg-volk","https://github.com/gnuradio/volk",4752.915,39,93,0,74,106,0,0,129,3,"3",1.70454545454545,1.82170542635659 -"voltron",-1.8139477845,1.3185040904,-2.8023383764,"https://salsa.debian.org/python-team/packages/voltron","https://github.com/snare/voltron.git",2775.5086458333,5,31,0,19,212,0,1,213,2,"2",1.86111111111111,1.99530516431925 -"voluptuous",-0.403966828,1.2358837228,-0.7514608215,"https://salsa.debian.org/python-team/packages/voluptuous","https://github.com/alecthomas/voluptuous",4900.0540740741,38,69,0,73,81,0,0,132,3,"3",1.64485981308411,1.61363636363636 -"voms",-0.756674276,-0.2090198319,-0.9203293452,"https://salsa.debian.org/ellert/voms","https://github.com/italiangrid/voms",3745.5262731482,4,20,0,8,29,0,5,35,2,"2",1.83333333333333,1.82857142857143 -"waitress",-0.001435195,0.7796936159,-0.2577457307,"https://salsa.debian.org/python-team/packages/waitress","https://github.com/Pylons/waitress.git",4372.6596990741,10,50,0,48,135,0,0,153,3,"3",1.83333333333333,1.88235294117647 -"wal2json",-1.8275745539,0.5424600488,-2.3404171148,"https://salsa.debian.org/postgresql/wal2json","https://github.com/eulerto/wal2json.git",3393.2528703704,6,15,0,13,173,0,0,177,2,"2",1.71428571428571,1.9774011299435 -"wand",-0.67759885,-0.1056309981,-0.8962104321,"https://salsa.debian.org/debian/wand","https://github.com/emcconville/wand",4461.4997222222,24,94,1,85,430,0,0,439,3,"3",1.79661016949153,1.97949886104784 -"WavPack",0.5006437508,1.2816911597,0.1442013441,"https://salsa.debian.org/multimedia-team/wavpack","https://github.com/dbry/WavPack",5719.9072569445,11,19,0,26,86,0,0,87,4,"4",1.63333333333333,1.98850574712644 -"libwbxml",0.5716576747,2.0439677491,-0.0953236447,"https://salsa.debian.org/debian/wbxml2","https://github.com/libwbxml/libwbxml.git",5170.821412037,0,19,0,15,25,0,0,28,4,"4",2,1.89285714285714 -"wcwidth",0.3330909557,1.8989641963,-0.0738762364,"https://salsa.debian.org/python-team/packages/wcwidth","https://github.com/jquast/wcwidth",3540.9241550926,5,18,0,16,80,0,0,81,2,"2",1.78260869565217,1.98765432098765 -"websocketpp",-0.3732259601,1.2705562016,-0.7134226458,"https://salsa.debian.org/debian/websocketpp","https://github.com/zaphoyd/websocketpp.git",3911.9273263889,7,63,0,40,237,0,21,277,3,"3",1.9,1.85559566787004 -"websploit",-0.4221028192,2.1023366852,-1.0726176237,"https://salsa.debian.org/pkg-security-team/websploit","https://github.com/websploit/websploit",0.0014814815,1,1,0,1,3,0,0,4,1,"1",1.5,1.75 -"weevely3",-0.2507372174,2.1708290167,-0.8636427805,"https://salsa.debian.org/pkg-security-team/weevely","https://github.com/epinna/weevely3.git",3185.5150578704,7,21,0,18,24,0,3,39,2,"2",1.75,1.61538461538462 -"welle.io",-1.1503735792,0.8698707092,-1.5560375998,"https://salsa.debian.org/debian-hamradio-team/welle.io","https://github.com/AlbrechtL/welle.io",2902.9566203704,11,44,0,35,243,0,3,249,2,"2",1.8,1.97590361445783 -"weresync",0.8686224385,5.3149179418,-0.6110888212,"https://salsa.debian.org/python-team/packages/weresync","https://github.com/DonyorM/weresync.git",2224.0163194445,5,4,0,4,47,0,0,47,1,"1",1.44444444444444,2 -"weupnp",-1.9200689609,0.314231077,-2.3479232511,"https://salsa.debian.org/debian/weupnp","https://github.com/bitletorg/weupnp.git",896.40375,1,9,0,8,23,0,2,27,1,"1",1.9,1.85185185185185 -"wfmath",-0.3893875883,0.837955788,-0.9792345009,"https://salsa.debian.org/games-team/wfmath","https://github.com/worldforge/wfmath",5506.8696990741,0,8,0,7,8,0,0,9,4,"4",2,1.88888888888889 -"wfuzz",0.3494531903,3.0367255196,-0.346839296,"https://salsa.debian.org/pkg-security-team/wfuzz","https://github.com/xmendez/wfuzz.git",3000.7348148148,13,27,0,24,91,0,5,111,2,"2",1.675,1.81981981981982 -"whatthepatch",-1.2344880678,1.15651314,-1.8143537794,"https://salsa.debian.org/python-team/packages/whatthepatch","https://github.com/cscorley/whatthepatch",3792.0029513889,6,11,0,11,23,0,0,23,3,"3",1.64705882352941,2 -"when",-0.2471365546,1.4766184372,-0.8165939727,"https://salsa.debian.org/carnil/when","https://github.com/bcrowell/when/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA -"whichcraft",-0.303651311,1.9645474175,-0.7638381926,"https://salsa.debian.org/python-team/packages/whichcraft","https://github.com/cookiecutter/whichcraft",2896.9858101852,2,14,0,8,22,0,0,22,2,"2",1.875,2 -"wanderlust",-0.3325500668,0.46879212,-0.6623736703,"https://salsa.debian.org/debian/wl","https://github.com/wanderlust/wanderlust",5747.0710416667,6,25,0,16,85,0,0,85,4,"4",1.80645161290323,2 -"wanderlust",-0.9633885518,-0.6844818162,-1.0856880817,"https://salsa.debian.org/debian/wl-beta","https://github.com/wanderlust/wanderlust",5747.0710416667,6,25,0,16,85,0,0,85,4,"4",1.80645161290323,2 -"WPEBackend-fdo",0.5730095986,3.296980661,-0.0681747088,"https://salsa.debian.org/webkit-team/wpebackend-fdo","https://github.com/Igalia/WPEBackend-fdo",2058.3566319445,11,16,1,15,33,0,0,35,1,"1",1.59259259259259,1.94285714285714 -"Xastir",0.1089482482,0.8635088142,-0.3202862478,"https://salsa.debian.org/debian-hamradio-team/xastir","https://github.com/Xastir/Xastir.git",5658.7705902778,2,27,0,23,47,0,1,57,4,"4",1.93103448275862,1.82456140350877 -"xcape",0.1031866498,2.6635244357,-0.4881717246,"https://salsa.debian.org/debian/xcape","https://github.com/alols/xcape",2160.4542361111,3,26,0,19,215,0,0,216,1,"1",1.89655172413793,1.99537037037037 -"xcffib",0.3422766078,1.6439736239,-0.2089170835,"https://salsa.debian.org/python-team/packages/xcffib","https://github.com/tych0/xcffib.git",3466.6135069445,10,9,0,14,67,0,0,67,2,"2",1.47368421052632,2 -"xCHM",0.2106957608,0.7959718479,-0.0859691061,"https://salsa.debian.org/debian/xchm","https://github.com/rzvncj/xCHM.git",5664.2862037037,3,5,0,6,25,0,0,25,4,"4",1.625,2 -"xcscope.el",0.2222567121,2.7358133073,-0.5096652742,"https://salsa.debian.org/debian/xcscope-el","https://github.com/dkogan/xcscope.el",3521.9445949074,2,6,0,6,30,0,0,31,2,"2",1.75,1.96774193548387 -"xdffileio",-0.3370360933,3.1399742139,-1.5172901103,"https://salsa.debian.org/med-team/xdffileio","https://github.com/mmlabs-mindmaze/xdffileio.git",3980.6902777778,1,9,0,3,4,0,0,6,3,"3",1.9,1.66666666666667 -"xdms-debian",-0.3245085497,1.1111188277,-0.7327199722,"https://github.com/glaubitz/xdms-debian","https://github.com/glaubitz/xdms-debian",2621.1444212963,2,1,0,3,2,0,0,5,1,"1",1.33333333333333,1.4 -"xdotool",1.2968912917,2.6433354619,0.5854640504,"https://salsa.debian.org/debian/xdotool","https://github.com/jordansissel/xdotool.git",5532.0414351852,34,28,0,50,581,0,0,582,4,"4",1.45161290322581,1.99828178694158 -"xen-tools",0.1849226805,0.4044499915,0.02937965,"https://github.com/xen-tools/xen-tools","https://github.com/xen-tools/xen-tools",5773.4961921296,25,18,2,29,33,0,0,52,4,"4",1.41860465116279,1.63461538461538 -"xmldiff",0.559598996,1.5801414897,0.007932953,"https://salsa.debian.org/debian/xmldiff","https://github.com/Shoobx/xmldiff.git",5659.7240162037,11,15,0,19,92,0,0,95,4,"4",1.57692307692308,1.96842105263158 -"xmltv",-0.0141973655,0.1968271173,-0.1465991903,"https://salsa.debian.org/nickm/xmltv","https://github.com/XMLTV/xmltv.git",5729.3252314815,14,54,0,44,137,0,0,159,4,"4",1.79411764705882,1.86163522012579 -"xmoto",-0.0128577775,0.350476721,-0.2212793709,"https://salsa.debian.org/games-team/xmoto","https://github.com/xmoto/xmoto",5752.6098148148,7,30,1,14,32,0,1,34,4,"4",1.81081081081081,1.94117647058824 -"yadm",0.155795293,2.4789916734,-0.5346609613,"https://salsa.debian.org/debian/yadm","https://github.com/TheLocehiliosan/yadm",1719.5473611111,26,32,0,34,348,0,0,348,1,"1",1.55172413793103,2 -"yanc",-1.5009992611,1.4616219544,-2.2668515294,"https://salsa.debian.org/python-team/packages/yanc","https://github.com/0compute/yanc",1361.9793865741,0,3,0,2,13,0,0,13,1,"1",2,2 -"yatm",-0.9969942564,0.469884003,-1.3959449427,"https://salsa.debian.org/debian/yatm","https://github.com/mlang/yatm.git",2272.488912037,0,3,0,1,4,0,0,5,1,"1",2,1.8 -"yder",-0.5735586705,1.4948558419,-1.0176765614,"https://salsa.debian.org/debian-iot-team/oauth2/yder.git","https://github.com/babelouest/yder",1282.873275463,2,11,0,9,16,0,0,16,1,"1",1.84615384615385,2 -"ydpdict",-1.6620122332,-0.9650225761,-1.8878460738,"https://github.com/porridge/ydpdict","https://github.com/porridge/ydpdict",5724.9537731482,0,4,0,3,0,0,0,3,4,"4",2,1 +"project_name","underproduction_mean","underproduction_low","underproduction_high","debian_vcs_link","upstream_vcs_link","age_of_project","contributors","collaborators","milestone_count","api_contrib_count","issue_contrib_count","file_contrib_count","wiki_contrib_count","total_contrib","new.age","new.age.factor","mmt","issue_mmt","scaled_age","sqrt_issue_mmt","wiki_mmt","has_readme","has_contrib" +"0xFFFF",-0.510168673,1.4527994311,-1.0011708662,"https://salsa.debian.org/debian/0xffff","https://github.com/pali/0xFFFF",5557.8427777778,3,11,0,6,9,0,0,9,4,"4",1.78571428571429,2,1.49673689512719,1.4142135623731,1,0,0 +"3270font",0.7956265926,4.3574626903,-0.214217071,"https://github.com/kilobyte/3270font/tree/debian","https://github.com/kilobyte/3270font",3596.6082060185,6,15,0,9,3,0,0,11,2,"2",1.71428571428571,1.27272727272727,0.1476852007411,1.12815214963553,1,1,0 +"4pane-debian-dir",-0.2426279425,2.299894807,-0.8194220994,"https://github.com/dghart/4pane-debian-dir/tree/master/","https://github.com/dghart/4pane-debian-dir",2236.6859722222,0,2,0,1,2,0,0,2,1,"1",2,2,-0.787748744873326,1.4142135623731,1,0,0 +"4ti2",0.4764408337,3.0285400273,-0.2191943656,"https://salsa.debian.org/math-team/4ti2","https://github.com/4ti2/4ti2.git",5656.5603819445,3,11,0,6,18,0,0,18,4,"4",1.78571428571429,2,1.56464062937932,1.4142135623731,1,0,0 +"6tunnel",-0.563131582,0.346490728,-0.8398599484,"https://salsa.debian.org/debian/6tunnel","https://github.com/wojtekka/6tunnel",2673.0241203704,1,7,0,5,18,0,1,19,1,"1",1.875,1.94736842105263,-0.487609880017101,1.39548142984872,1.05263157894737,1,0 +"a2jmidid",0.3594669173,1.948434404,-0.1562277334,"https://salsa.debian.org/multimedia-team/a2jmidid","https://github.com/linuxaudio/a2jmidid.git",4551.7947916667,8,8,0,12,23,0,0,27,3,"3",1.5,1.85185185185185,0.804718326904919,1.36082763487954,1,0,0 +"abGate",0.1706833434,2.3128885166,-0.4447167424,"https://salsa.debian.org/multimedia-team/abgate","https://github.com/antanasbruzas/abGate.git",1677.5786226852,2,8,0,4,5,0,0,6,1,"1",1.8,1.83333333333333,-1.17233543740751,1.35400640077266,1,1,0 +"link",0.2419062498,3.4521460543,-0.7141549374,"https://salsa.debian.org/multimedia-team/ableton-link","https://github.com/Ableton/link.git",2835.8410648148,20,10,0,19,81,0,0,88,2,"2",1.33333333333333,1.92045454545455,-0.375614875472361,1.38580465631147,1,0,0 +"acme-tiny",-0.0997740414,0.6982852517,-0.3572560835,"https://salsa.debian.org/letsencrypt-team/acme-tiny","https://github.com/diafygi/acme-tiny.git",2161.2252314815,7,34,0,36,354,0,0,355,1,"1",1.82926829268293,1.99718309859155,-0.839655050025061,1.41321728640416,1,1,0 +"acpi_call",0.1056920793,1.3196660142,-0.2309830486,"https://salsa.debian.org/moonsweep/acpi-call","https://github.com/nix-community/acpi_call.git",4711.2498958333,14,26,0,29,24,0,0,39,3,"3",1.65,1.61538461538462,0.914400861341123,1.27097781860449,1,1,0 +"adapta-kde",-0.0885623802,2.0889906357,-0.5313636783,"https://salsa.debian.org/debian/adapta-kde","https://github.com/PapirusDevelopmentTeam/adapta-kde.git",636.9053819444,2,5,0,3,0,0,0,3,1,"1",1.71428571428571,1,-1.88817127822908,1,1,1,0 +"admesh",0.1260876875,1.8100481532,-0.381631879,"https://salsa.debian.org/science-team/admesh","https://github.com/admesh/admesh",3319.1463078704,15,9,1,20,42,0,0,44,2,"2",1.375,1.95454545454545,-0.0431692993855759,1.39805059083906,1,0,0 +"ADMS",-0.6746373026,2.0836908399,-1.2638452949,"https://salsa.debian.org/science-team/adms","https://github.com/Qucs/ADMS.git",3397.3394444445,6,10,0,12,44,0,3,49,2,"2",1.625,1.89795918367347,0.0106165072199171,1.37766439442757,1.06122448979592,1,0 +"ADOL-C",-0.218347665,0.2989988071,-0.4200973016,"https://salsa.debian.org/science-team/adolc","https://github.com/coin-or/ADOL-C",5292.5953472222,11,44,0,11,43,0,2,48,4,"4",1.8,1.89583333333333,1.31428421925905,1.37689263682153,1.04166666666667,0,0 +"taplib",-0.1607320251,2.2507776056,-0.6544297324,"https://salsa.debian.org/debian-astro-team/adql","https://github.com/gmantele/taplib.git",3533.9449074074,2,12,0,7,26,0,0,26,2,"2",1.85714285714286,2,0.104581723786125,1.4142135623731,1,0,0 +"adwaita-qt",0.205201025,2.3560485193,-0.2873294601,"https://salsa.debian.org/debian/adwaita-qt","https://github.com/FedoraQt/adwaita-qt.git",3324.8509953704,3,11,0,9,135,0,0,137,2,"2",1.78571428571429,1.98540145985401,-0.0392452821116427,1.4090427459286,1,1,0 +"aeskulap",-0.0079946864,0.7360602484,-0.280025211,"https://salsa.debian.org/med-team/aeskulap","https://github.com/pipelka/aeskulap.git",0.1217013889,0,2,0,2,3,0,0,4,1,"1",2,1.75,-2.32618828832094,1.3228756555323,1,0,0 +"afew",-0.174094467,3.0914363808,-1.0829316549,"https://salsa.debian.org/python-team/packages/afew","https://github.com/afewmail/afew",4444.5631134259,14,62,1,59,188,0,0,190,3,"3",1.81578947368421,1.98947368421053,0.730958115196613,1.41048703794488,1,0,0 +"AFFLIBv3",0.4855383072,1.2966231457,0.0866885423,"https://salsa.debian.org/pkg-security-team/afflib","https://github.com/sshock/AFFLIBv3",3923.2419675926,1,18,0,14,23,0,0,28,3,"3",1.94736842105263,1.82142857142857,0.372362980666204,1.34960311626366,1,0,0 +"afio",0.7471975104,2.0817065146,0.0678453147,"https://salsa.debian.org/debian/afio","https://github.com/kholtman/afio",3009.1574652778,0,6,0,4,8,0,0,8,2,"2",2,2,-0.256397731803631,1.4142135623731,1,0,0 +"AFLplusplus",-0.6866375311,2.5698791713,-1.4766466472,"https://salsa.debian.org/pkg-security-team/aflplusplus","https://github.com/AFLplusplus/AFLplusplus.git",1658.7534375,94,190,0,201,0,0,0,201,1,"1",1.66901408450704,1,-1.18528449935906,1,1,1,1 +"aggdraw",-1.0738283571,1.0896722547,-1.5311943301,"https://salsa.debian.org/debian-gis-team/aggdraw","https://github.com/pytroll/aggdraw",4403.4778240741,4,15,2,15,48,0,0,49,3,"3",1.78947368421053,1.97959183673469,0.702697253384112,1.40697968597087,1,0,0 +"aha",-0.0329000287,2.2809487303,-0.5337481366,"https://salsa.debian.org/debian/aha","https://github.com/theZiz/aha.git",3422.3746180556,1,26,0,18,0,0,1,19,2,"2",1.96296296296296,1,0.0278371619369143,1,1.05263157894737,1,0 +"aiodns",0.1656826228,1.9021756708,-0.2783622395,"https://salsa.debian.org/python-team/packages/aiodns","https://github.com/saghul/aiodns.git",3490.3476273148,13,17,0,27,96,0,0,100,2,"2",1.56666666666667,1.96,0.0745929680164429,1.4,1,0,0 +"aioprocessing",-1.8106172723,-0.4031506429,-2.0700475194,"https://github.com/davesteele/aioprocessing","https://github.com/davesteele/aioprocessing",3054.801087963,3,13,0,8,1,0,0,8,2,"2",1.8125,1.125,-0.225001382071659,1.06066017177982,1,1,0 +"airspyone_host",0.135032826,1.7638004482,-0.2266634267,"https://salsa.debian.org/bottoms/pkg-airspy-host","https://github.com/airspy/airspyone_host.git",3592.9147685185,9,15,0,21,60,0,6,68,2,"2",1.625,1.88235294117647,0.145144638694503,1.37198868114007,1.08823529411765,1,0 +"airspyhf",0.4277792447,3.1863173209,-0.2431051192,"https://salsa.debian.org/debian-hamradio-team/airspyhf","https://github.com/airspy/airspyhf.git",2334.5221527778,3,13,0,13,36,0,0,38,1,"1",1.8125,1.94736842105263,-0.720451305264967,1.39548142984872,1,1,0 +"aiscm",-2.1266027747,-0.9022998492,-2.4482757524,"https://github.com/wedesoft/aiscm","https://github.com/wedesoft/aiscm",3606.1918865741,0,8,0,3,7,0,0,8,2,"2",2,1.875,0.154277416011091,1.36930639376292,1,1,0 +"alabaster",1.5840034231,5.0180871348,0.3754116681,"https://github.com/jbouse-debian/alabaster","https://github.com/jbouse-debian/alabaster",3086.3917592593,1,6,0,4,4,0,0,5,2,"2",1.85714285714286,1.8,-0.203271473139431,1.34164078649987,1,0,0 +"amavisd-milter",0.615386065,3.5879174633,-0.470593397,"https://salsa.debian.org/debian/amavisd-milter","https://github.com/prehor/amavisd-milter",5582.9392824074,1,5,0,3,7,0,0,7,4,"4",1.83333333333333,2,1.51399973690107,1.4142135623731,1,1,1 +"amazon-ecr-credential-helper",-1.2935017996,1.3375714894,-1.8855602579,"https://github.com/awslabs/amazon-ecr-credential-helper/tree/debian","https://github.com/awslabs/amazon-ecr-credential-helper",2759.7970717593,31,49,1,56,371,0,0,396,2,"2",1.6125,1.93686868686869,-0.427922375634049,1.39171429786026,1,1,1 +"amora",-0.6385985537,1.533812873,-1.3373354269,"https://github.com/amora/amora/tree/master/amora-server","https://github.com/amora/amora",4404.2341666667,0,11,0,6,5,0,0,9,3,"3",2,1.55555555555556,0.703217509997357,1.24721912892465,1,0,0 +"amsynth",0.3306364812,1.2209617467,-0.1269359447,"https://salsa.debian.org/multimedia-team/amsynth","https://github.com/nixxcode/amsynth.git",5332.9271990741,11,24,0,21,100,0,3,109,4,"4",1.68571428571429,1.91743119266055,1.34202682275075,1.38471339729944,1.02752293577982,1,1 +"amule",0.4839430086,0.6876326423,0.3238736448,"https://salsa.debian.org/debian/amule","https://github.com/amule-project/amule.git",5047.6080555556,11,25,0,16,46,0,0,55,4,"4",1.69444444444444,1.83636363636364,1.14576765031574,1.35512495230648,1,0,0 +"amule-emc",-0.3584249255,1.8578303929,-0.8058880504,"https://salsa.debian.org/morph/amule-emc","https://github.com/palopezv/amule-emc",2735.137662037,0,2,0,0,1,0,0,1,1,"1",2,2,-0.444884557999918,1.4142135623731,1,0,0 +"analog-ce",0.3100100337,0.6308951381,0.1129534728,"https://salsa.debian.org/debian/analog","https://github.com/c-amie/analog-ce.git",798.2990509259,2,1,0,1,4,0,0,5,1,"1",1.33333333333333,1.8,-1.7771552856814,1.34164078649987,1,1,0 +"anfo",-0.5164343879,1.1141228746,-0.8858012402,"https://salsa.debian.org/med-team/anfo","https://github.com/udo-stenzel/anfo",2083.7738310185,0,5,0,1,1,0,1,2,1,"1",2,1.5,-0.892930647208451,1.22474487139159,1.5,1,0 +"anomaly",-2.6979232432,-0.9294432931,-3.0157661638,"https://github.com/mogaal/anomaly","https://github.com/mogaal/anomaly",224.8161226852,0,2,0,1,2,0,0,3,1,"1",2,1.66666666666667,-2.17163034092714,1.29099444873581,1,0,0 +"anosql",-1.7531962484,0.6178873531,-2.3213037286,"https://salsa.debian.org/python-team/packages/anosql","https://github.com/honza/anosql",2207.9932523148,1,18,0,12,24,0,0,24,1,"1",1.94736842105263,2,-0.807485273570605,1.4142135623731,1,0,0 +"ansible-lint",0.2113200286,2.3970134545,-0.4192549848,"https://salsa.debian.org/python-team/packages/ansible-lint","https://github.com/ansible/ansible-lint",3772.1254976852,239,77,4,263,0,0,0,263,3,"3",1.24367088607595,1,0.268416245934036,1,1,1,0 +"antpm",-0.4257977771,1.2499417918,-0.9097264377,"https://salsa.debian.org/debian/antpm","https://github.com/ralovich/antpm",5246.6502893519,2,16,0,6,4,0,0,7,4,"4",1.88888888888889,1.57142857142857,1.28268052479991,1.25356634105602,1,0,0 +"anypaper",-0.8366781332,1.8293957466,-1.525331321,"https://github.com/mogaal/anypaper","https://github.com/mogaal/anypaper",358.8230671296,0,1,0,1,0,0,0,1,1,"1",2,1,-2.07945253717772,1,1,0,0 +"aoeui",-1.5753745078,-0.1018330597,-2.0145689052,"https://salsa.debian.org/debian/aoeui","https://github.com/pklausler/aoeui.git",0.0311342593,0,4,0,1,2,0,0,3,1,"1",2,1.66666666666667,-2.32625058568272,1.29099444873581,1,0,0 +"apachetop",-0.1433968655,0.1384791106,-0.2436187019,"https://salsa.debian.org/debian/apachetop","https://github.com/tessus/apachetop.git",4171.4287847222,1,5,0,3,11,0,0,12,3,"3",1.83333333333333,1.91666666666667,0.543080370107609,1.38443731048635,1,0,0 +"apel",-0.1699911676,0.0467119457,-0.2503884599,"https://salsa.debian.org/debian/apel","https://github.com/wanderlust/apel",5064.9154166667,2,8,0,5,0,0,0,5,4,"4",1.8,1,1.15767266421285,1,1,0,0 +"apipkg",0.1848523093,2.3386412167,-0.297646363,"https://salsa.debian.org/python-team/packages/apipkg","https://github.com/pytest-dev/apipkg",4796.3536574074,4,14,0,15,32,0,0,36,3,"3",1.77777777777778,1.88888888888889,0.972940199471993,1.37436854187255,1,0,0 +"aplpy",-0.0173305787,1.6394741457,-0.5266587065,"https://salsa.debian.org/debian-astro-team/aplpy","https://github.com/aplpy/aplpy.git",4761.8146296296,3,44,0,33,0,0,1,34,3,"3",1.93617021276596,1,0.949182238737958,1,1.02941176470588,0,0 +"appdirs",0.3458277639,1.9577727359,-0.1122252661,"https://salsa.debian.org/python-team/packages/appdirs","https://github.com/ActiveState/appdirs.git",4580.7970601852,5,36,0,28,143,0,0,144,3,"3",1.8780487804878,1.99305555555556,0.824667781217682,1.41175619550812,1,0,0 +"appstream-generator",-1.1332713071,-0.1060546301,-1.4824521416,"https://salsa.debian.org/pkgutopia-team/appstream-generator","https://github.com/ximion/appstream-generator",2846.9885185185,14,5,0,14,47,0,0,47,2,"2",1.26315789473684,2,-0.367947005690942,1.4142135623731,1,1,0 +"apriltag",-1.1179244852,1.091725818,-1.6047836993,"https://salsa.debian.org/science-team/apriltag","https://github.com/AprilRobotics/apriltag.git",1884.0502083333,21,28,0,42,0,0,0,42,1,"1",1.57142857142857,1,-1.0303122207704,1,1,1,0 +"aprsdigi",0.1781157768,2.7404004262,-0.7343395696,"https://salsa.debian.org/debian-hamradio-team/aprsdigi","https://github.com/n2ygk/aprsdigi.git",5178.2461574074,2,9,0,4,7,0,0,7,4,"4",1.81818181818182,2,1.2356281673555,1.4142135623731,1,1,0 +"aprx",-0.2704326877,2.1233467944,-0.9280144637,"https://salsa.debian.org/debian-hamradio-team/aprx","https://github.com/PhirePhly/aprx",4964.0779861111,6,4,1,7,43,0,0,43,3,"3",1.4,2,1.08831078955114,1.4142135623731,1,0,0 +"apt-forktracer",0.0547352043,1.112259075,-0.2401275584,"https://github.com/porridge/apt-forktracer","https://github.com/porridge/apt-forktracer",5457.9246990741,1,3,0,2,1,0,0,2,4,"4",1.75,1.5,1.42800740436867,1.22474487139159,1,0,0 +"apt-offline",0.7681910278,1.8077281258,0.1487399152,"https://github.com/rickysarraf/apt-offline","https://github.com/rickysarraf/apt-offline",5588.93,4,18,3,12,62,0,2,69,4,"4",1.81818181818182,1.89855072463768,1.51812050237974,1.37787906749384,1.02898550724638,0,0 +"apt-venv",0.5985278149,4.8192892935,-0.7291864283,"https://salsa.debian.org/debian/apt-venv","https://github.com/LeoIannacone/apt-venv",1672.1250694445,0,3,0,1,7,0,0,7,1,"1",2,2,-1.17608670986912,1.4142135623731,1,1,0 +"aptitude-robot",0.0330441368,2.6987643495,-0.6758866251,"https://github.com/elmar/aptitude-robot","https://github.com/elmar/aptitude-robot",3822.3247685185,3,7,1,6,9,0,0,10,3,"3",1.7,1.9,0.302946236558187,1.37840487520902,1,0,0 +"apulse-debian",-0.1771724569,1.2997369797,-0.4576897761,"https://github.com/exaexa/apulse-debian","https://github.com/exaexa/apulse-debian",2693.7106712963,2,11,0,9,2,0,0,9,1,"1",1.84615384615385,1.22222222222222,-0.473380461986521,1.10554159678513,1,1,0 +"apvlv",0.8026186076,2.4912926837,-0.0110446926,"https://salsa.debian.org/debian/apvlv","https://github.com/naihe2010/apvlv",4571.1944675926,1,28,0,18,92,0,0,94,3,"3",1.96551724137931,1.97872340425532,0.818062557143987,1.4066710362609,1,1,0 +"arachne-pnr",-0.2393988119,0.9055823033,-0.5128499486,"https://salsa.debian.org/science-team/arachne-pnr","https://github.com/cseed/arachne-pnr.git",1523.5826388889,1,29,0,24,90,0,0,91,1,"1",1.96666666666667,1.98901098901099,-1.27826286998519,1.41032300875047,1,1,0 +"arc",1.0034305192,2.95692526,0.1704629703,"https://git.hadrons.org/cgit/debian/pkgs/arc.git","https://github.com/ani6al/arc",0.1011921296,1,1,0,1,0,0,0,1,1,"1",1.5,1,-2.32620239578744,1,1,0,0 +"arc-theme",0.0557512099,0.9470106383,-0.1788662281,"https://github.com/UbuntuBudgie/arc-theme/tree/debian","https://github.com/UbuntuBudgie/arc-theme",2773.5425578704,36,30,0,2,2,0,0,3,2,"2",1.45454545454545,1.66666666666667,-0.418467427411458,1.29099444873581,1,0,0 +"arch-test",0.0607618911,0.902121307,-0.1116504733,"https://github.com/kilobyte/arch-test/tree/debian","https://github.com/kilobyte/arch-test",2721.0558912037,2,7,0,6,10,0,0,10,1,"1",1.77777777777778,2,-0.454570822496867,1.4142135623731,1,0,0 +"archmage",-0.5766750111,-0.3037651495,-0.666439779,"https://salsa.debian.org/python-team/packages/archmage","https://github.com/dottedmag/archmage",4875.1846412037,1,4,0,3,16,0,0,16,3,"3",1.8,2,1.02716475465364,1.4142135623731,1,1,0 +"arcp-py",-5.0400309655,-2.6837801512,-5.4802256243,"https://salsa.debian.org/python-team/packages/arcp","https://github.com/stain/arcp-py.git",744.5613194444,0,3,0,2,4,0,0,4,1,"1",2,2,-1.81411923622126,1.4142135623731,1,0,0 +"ardentryst",1.6336595561,4.7901963616,0.4114961199,"https://salsa.debian.org/games-team/ardentryst","https://github.com/ardentryst/ardentryst",3087.7143865741,4,6,0,6,7,0,0,7,2,"2",1.6,2,-0.202361692817503,1.4142135623731,1,1,0 +"arename",-0.7754375198,0.9646514013,-1.1302132776,"https://salsa.debian.org/perl-team/modules/packages/arename","https://github.com/ft/arename.git",5509.5740972222,2,1,0,3,3,0,0,4,4,"4",1.33333333333333,1.75,1.46353487726204,1.3228756555323,1,0,0 +"phc-winner-argon2",0.743835667,2.5300173326,0.1203530186,"https://salsa.debian.org/pkg-security-team/argon2","https://github.com/P-H-C/phc-winner-argon2",2090.9970833333,21,70,0,62,101,0,0,123,1,"1",1.76923076923077,1.82113821138211,-0.887962072355358,1.34949553959326,1,1,0 +"aif",-0.0994853605,0.2382471007,-0.2885738031,"https://salsa.debian.org/pkg-security-team/arno-iptables-firewall","https://github.com/arno-iptables-firewall/aif.git",5173.1893171296,1,13,0,3,50,0,0,50,4,"4",1.92857142857143,2,1.23214977724183,1.4142135623731,1,0,0 +"arp-scan",0.7973854024,2.157870748,0.1913515465,"https://salsa.debian.org/pkg-security-team/arp-scan","https://github.com/royhills/arp-scan",5689.2689583333,1,16,0,11,61,0,1,64,4,"4",1.94117647058824,1.953125,1.58713949873113,1.39754248593737,1.015625,1,1 +"arpack-ng",0.3837318586,0.9028165971,0.1090371111,"https://salsa.debian.org/science-team/arpack","https://github.com/opencollab/arpack-ng.git",4374.6474884259,45,30,0,53,0,0,0,53,3,"3",1.4,1,0.682866064542159,1,1,1,0 +"arping",0.530645087,1.2970011805,0.131538231,"https://salsa.debian.org/debian/arping","https://github.com/ThomasHabets/arping",5640.3308564815,6,8,1,10,48,0,0,49,4,"4",1.57142857142857,1.97959183673469,1.55347701379747,1.40697968597087,1,0,0 +"assess",-1.4000321709,1.1332183932,-2.0278507888,"https://salsa.debian.org/emacsen-team/assess-el","https://github.com/phillord/assess.git",2948.0093402778,0,8,0,6,12,0,0,13,2,"2",2,1.92307692307692,-0.298458983847431,1.38675049056307,1,1,0 +"astLib",-0.4953363519,0.6080154454,-0.6729060494,"https://salsa.debian.org/debian-astro-team/astlib","https://github.com/mattyowl/astLib.git",2666.6349305556,0,4,0,2,5,0,0,5,1,"1",2,2,-0.49200473796501,1.4142135623731,1,0,0 +"astromenace",-0.4083684893,0.5804361033,-0.6175886343,"https://salsa.debian.org/games-team/astromenace","https://github.com/viewizard/astromenace.git",5567.4927893519,5,4,0,7,21,0,0,22,4,"4",1.44444444444444,1.95454545454545,1.50337473674611,1.39805059083906,1,0,0 +"astropy-healpix",-0.4944474025,0.2280631702,-0.7220614086,"https://salsa.debian.org/debian-astro-team/astropy-healpix","https://github.com/astropy/astropy-healpix",2653.9758333333,3,14,5,12,33,0,2,35,1,"1",1.82352941176471,1.94285714285714,-0.500712404453789,1.39386410487434,1.05714285714286,0,0 +"atig",-1.8648493244,0.279641993,-2.4212366269,"https://salsa.debian.org/ruby-team/atig","https://github.com/atig/atig",4572.5188078704,2,14,1,10,17,0,0,17,3,"3",1.875,2,0.818973515741922,1.4142135623731,1,1,0 +"atlas-cpp",0.0341726983,1.1760438151,-0.4721381555,"https://salsa.debian.org/games-team/atlas-cpp","https://github.com/worldforge/atlas-cpp",5588.9221643519,1,7,0,7,9,0,0,11,4,"4",1.875,1.81818181818182,1.5181151125633,1.34839972492648,1,0,0 +"audacious-plugins",1.7224717183,2.5284554407,1.1638170855,"https://salsa.debian.org/multimedia-team/audacious-plugins","https://github.com/audacious-media-player/audacious-plugins",5769.3870138889,19,100,0,83,0,0,0,83,4,"4",1.84033613445378,1,1.64224937704683,1,1,0,0 +"audiofile",0.422362873,1.1370882832,0.0919717085,"https://salsa.debian.org/multimedia-team/audiofile","https://github.com/mpruett/audiofile",1573.8945023148,10,2,0,8,60,0,0,61,1,"1",1.16666666666667,1.98360655737705,-1.24365543159931,1.40840567926186,1,0,0 +"austin",-1.9885885289,0.9749582973,-2.7198737394,"https://github.com/P403n1x87/austin","https://github.com/P403n1x87/austin",1837.728599537,4,7,8,7,31,0,1,34,1,"1",1.63636363636364,1.91176470588235,-1.06217492895084,1.38266579688743,1.02941176470588,1,1 +"autocutsel-debian",0.1797843854,2.4764961713,-0.3873891003,"https://github.com/elmar/autocutsel-debian","https://github.com/elmar/autocutsel-debian",3741.7552430556,3,8,0,7,1,0,0,7,2,"2",1.72727272727273,1.14285714285714,0.247525810869837,1.0690449676497,1,0,0 +"autolog",-0.4586466955,0.5238636181,-1.0843460423,"https://salsa.debian.org/pkg-security-team/autolog","https://github.com/JKDingwall/autolog.git",1891.041099537,4,11,0,5,2,0,0,6,1,"1",1.73333333333333,1.33333333333333,-1.02550347746177,1.15470053837925,1,0,0 +"automx-debian",-0.602057718,1.6606574872,-1.3781487507,"https://github.com/wreiner/automx-debian.git","https://github.com/wreiner/automx-debian.git",38.1884490741,1,1,0,1,0,0,0,1,1,"1",1.5,1,-2.30000375578009,1,1,0,0 +"autopostgresqlbackup",0.0717331465,1.1779509822,-0.3973782275,"https://salsa.debian.org/kolter/autopostgresqlbackup","https://github.com/k0lter/autopostgresqlbackup",1670.5722222222,8,3,0,6,19,0,0,21,1,"1",1.27272727272727,1.9047619047619,-1.17715484889059,1.38013111868471,1,0,0 +"autorenamer",-0.3876192426,1.6252404011,-0.8867624476,"https://github.com/porridge/autorenamer","https://github.com/porridge/autorenamer",3637.0090277778,4,1,0,1,3,0,0,3,2,"2",1.2,2,0.175475245763651,1.4142135623731,1,0,0 +"averell",-3.3917060035,-0.2624325775,-4.2312153625,"https://github.com/jeanparpaillon/averell","https://github.com/jeanparpaillon/averell",585.8797453704,0,1,0,0,2,0,0,2,1,"1",2,2,-1.9232696914778,1.4142135623731,1,1,0 +"pkg-avr-evtd",0.7552713955,5.6393427141,-0.8294940805,"https://github.com/rbrito/pkg-avr-evtd","https://github.com/rbrito/pkg-avr-evtd",3784.5630787037,0,1,0,0,1,0,0,1,3,"3",2,2,0.276971540639054,1.4142135623731,1,0,0 +"awesfx",0.8705331012,2.216301783,0.1561432022,"https://salsa.debian.org/multimedia-team/awesfx","https://github.com/tiwai/awesfx.git",1324.8292592593,0,1,0,1,2,0,0,2,1,"1",2,2,-1.4149770537015,1.4142135623731,1,0,0 +"biber",0.025597249,0.3975294935,-0.1139709408,"https://github.com/debian-tex/biber","https://github.com/debian-tex/biber",5232.9484259259,2,17,0,7,1,0,0,7,4,"4",1.89473684210526,1.14285714285714,1.27325558280813,1.0690449676497,1,1,0 +"biblesync",0.3250691142,3.3691024007,-0.4547464712,"https://salsa.debian.org/pkg-crosswire-team/biblesync","https://github.com/karlkleinpaste/biblesync.git",2205.1738773148,0,6,0,3,7,0,0,7,1,"1",2,2,-0.809424604375613,1.4142135623731,1,1,0 +"bibtool",0.6789918484,1.7753249658,0.1299255999,"https://salsa.debian.org/tex-team/bibtool","https://github.com/ge-ne/bibtool.git",4734.0663541667,1,5,0,3,29,0,0,29,3,"3",1.83333333333333,2,0.930095354094711,1.4142135623731,1,1,0 +"binkd",-1.5291148732,-0.7208993868,-1.8984875134,"https://salsa.debian.org/md/binkd","https://github.com/pgul/binkd",5661.947349537,4,23,0,12,24,0,0,27,4,"4",1.85185185185185,1.88888888888889,1.56834610034282,1.37436854187255,1,1,0 +"bino",0.1952576502,1.8817060276,-0.4774605999,"https://github.com/schaal/bino","https://github.com/schaal/bino",3762.7609490741,0,4,0,2,1,0,0,2,2,"2",2,1.5,0.261974762414992,1.22474487139159,1,1,0 +"binwalk",0.2237508811,1.3345373481,-0.1513640072,"https://salsa.debian.org/pkg-security-team/binwalk","https://github.com/ReFirmLabs/binwalk",3364.812650463,24,70,1,71,16,0,25,105,2,"2",1.74468085106383,1.15238095238095,-0.0117573215742222,1.07349008024339,1.23809523809524,1,0 +"biometric-authentication",-0.485933223,1.5346031672,-1.0554082079,"https://github.com/ukui/biometric-authentication","https://github.com/ukui/biometric-authentication",1286.1941203704,2,8,0,4,14,0,0,14,1,"1",1.8,2,-1.44155255891206,1.4142135623731,1,1,0 +"bitstruct",-1.0422111169,1.6758733437,-1.7408364383,"https://salsa.debian.org/python-team/packages/bitstruct","https://github.com/eerimoq/bitstruct",3110.3722916667,2,10,0,6,34,0,0,34,2,"2",1.83333333333333,2,-0.186776262244049,1.4142135623731,1,0,0 +"blackboxwm",0.9240670694,1.5485949706,0.4955253,"https://salsa.debian.org/debian/blackbox","https://github.com/bbidulock/blackboxwm",5638.5930671296,4,7,0,8,24,0,0,27,4,"4",1.63636363636364,1.88888888888889,1.55228166077677,1.37436854187255,1,1,0 +"Bluebird",1.1380974193,4.2767964991,0.1562970087,"https://salsa.debian.org/desktop-themes-team/bluebird-gtk-theme","https://github.com/shimmerproject/Bluebird",2956.8580092593,3,16,0,11,26,0,0,27,2,"2",1.84210526315789,1.96296296296296,-0.292372352470214,1.40105780143539,1,1,0 +"bmap-tools",-0.1504052056,1.1252732802,-0.4879151231,"https://salsa.debian.org/debian/bmap-tools","https://github.com/intel/bmap-tools",4042.2103240741,15,24,3,22,30,0,1,40,3,"3",1.61538461538462,1.75,0.454196365209149,1.3228756555323,1.025,1,0 +"boinctui",-0.1432413703,1.420786312,-0.5512115785,"https://github.com/suleman1971/boinctui","https://github.com/suleman1971/boinctui",3939.3302893519,1,7,0,5,21,0,0,21,3,"3",1.875,2,0.383429468092919,1.4142135623731,1,0,0 +"bootinfoscript",-0.3809313102,1.1240423783,-0.7082417318,"https://salsa.debian.org/debian/boot-info-script","https://github.com/arvidjaar/bootinfoscript",3172.7375,1,7,0,3,19,0,0,20,2,"2",1.875,1.95,-0.143877829193632,1.39642400437689,1,0,0 +"booth",-2.5882433407,-1.3768010854,-2.9582924151,"https://salsa.debian.org/ha-team/booth","https://github.com/ClusterLabs/booth.git",4438.4447337963,6,37,0,22,34,0,0,41,3,"3",1.86046511627907,1.82926829268293,0.726749536312137,1.35250445200115,1,0,0 +"btchip-python",-1.1812672757,1.4023375583,-1.7414921007,"https://salsa.debian.org/python-team/packages/btchip-python","https://github.com/LedgerHQ/btchip-python.git",3019.8821180556,5,10,0,10,36,0,0,36,2,"2",1.66666666666667,2,-0.249020689194895,1.4142135623731,1,1,0 +"btfs",-0.1692325715,2.6773757299,-0.8903422829,"https://salsa.debian.org/debian/btfs","https://github.com/johang/btfs",2774.3356481482,11,11,0,15,32,0,0,39,2,"2",1.5,1.82051282051282,-0.417921893593895,1.34926380686388,1,1,0 +"bti",-0.2588997909,0.7195438277,-0.7283552221,"https://git.toastfreeware.priv.at/debian/bti.git","https://github.com/gregkh/bti.git",3076.6664699074,14,25,0,25,36,0,0,45,2,"2",1.64102564102564,1.8,-0.209961095210903,1.34164078649987,1,0,0 +"btrbk-packaging",0.1156617148,2.2848637542,-0.5286650377,"https://github.com/digint/btrbk-packaging","https://github.com/digint/btrbk-packaging",2807.8996064815,1,3,0,1,4,0,0,4,2,"2",1.75,2,-0.394834642577702,1.4142135623731,1,1,0 +"compsize",0.1058240849,2.8049694932,-0.4831458072,"https://github.com/kilobyte/compsize/tree/debian","https://github.com/kilobyte/compsize",1814.0231481482,0,8,0,7,52,0,0,52,1,"1",2,2,-1.07848092305411,1.4142135623731,1,1,0 +"budgie-desktop",-0.3863909585,-0.1050655044,-0.4722349352,"https://github.com/ubuntubudgie/budgie-desktop/tree/debian","https://github.com/ubuntubudgie/budgie-desktop",3652.4221643519,35,69,1,5,47,0,0,48,2,"2",1.66346153846154,1.97916666666667,0.186077301382343,1.40682858467784,1,0,0 +"budgie-extras",-0.3549864205,1.918871211,-0.8848111475,"https://github.com/UbuntuBudgie/budgie-extras/tree/debian","https://github.com/UbuntuBudgie/budgie-extras",2299.353599537,13,15,6,20,6,0,0,24,1,"1",1.53571428571429,1.25,-0.744642290383106,1.11803398874989,1,0,0 +"budgie-indicator-applet",-0.3165710056,1.8644335276,-0.7715039703,"https://github.com/UbuntuBudgie/budgie-indicator-applet/tree/debian","https://github.com/UbuntuBudgie/budgie-indicator-applet",2410.5153935185,0,6,1,2,24,0,0,24,1,"1",2,2,-0.668178715509848,1.4142135623731,1,1,0 +"buildapp",-0.6306447633,1.6220492356,-1.3420391452,"https://salsa.debian.org/common-lisp-team/buildapp","https://github.com/xach/buildapp",2095.158275463,0,6,0,6,25,0,0,25,1,"1",2,2,-0.885099761352854,1.4142135623731,1,0,0 +"bwm-ng",1.4012192264,3.1707005611,0.5566987616,"https://salsa.debian.org/debian/bwm-ng","https://github.com/vgropp/bwm-ng",5022.6577083333,1,12,0,7,29,0,0,30,4,"4",1.92307692307692,1.96666666666667,1.12860534414368,1.40237893119751,1,0,0 +"cafeobj",-1.8104313277,-1.0153734132,-2.0497300294,"https://github.com/CafeOBJ/cafeobj","https://github.com/CafeOBJ/cafeobj",3212.0939699074,0,7,0,3,3,0,2,7,2,"2",2,1.42857142857143,-0.116806150375526,1.19522860933439,1.28571428571429,1,0 +"capnproto-debian",0.2688312178,0.9760274096,-0.0981830892,"https://github.com/thomaslee/capnproto-debian","https://github.com/thomaslee/capnproto-debian",3752.338587963,3,4,0,3,5,0,0,5,2,"2",1.57142857142857,2,0.254805653671503,1.4142135623731,1,0,0 +"carbon-c-relay",-1.7206703797,2.1186998142,-2.7912817518,"https://salsa.debian.org/debian/carbon-c-relay","https://github.com/grobian/carbon-c-relay.git",3376.0489467593,8,36,0,25,0,0,1,26,2,"2",1.81818181818182,1,-0.00402834066830724,1,1.03846153846154,1,0 +"CARE-debian",-0.2836237154,3.5038071749,-1.3460010784,"https://github.com/ivoire/CARE-debian","https://github.com/ivoire/CARE-debian",2.7190856481,0,2,0,1,1,0,0,2,1,"1",2,1.5,-2.32440165571396,1.22474487139159,1,0,0 +"observatories-table",-0.1932098569,1.2412651155,-0.4565906785,"https://salsa.debian.org/debian-astro-team/casacore-data-observatories","https://github.com/casacore/observatories-table.git",766.9570138889,1,3,0,2,2,0,0,2,1,"1",1.75,2,-1.79871416944733,1.4142135623731,1,1,0 +"cassbeam",-0.2590451087,0.999251768,-0.6449745997,"https://salsa.debian.org/debian-astro-team/cassbeam","https://github.com/ratt-ru/cassbeam",1099.9010185185,0,5,0,3,3,0,0,3,1,"1",2,2,-1.56969583576665,1.4142135623731,1,0,0 +"casync",-1.0162004091,-0.313916552,-1.2265268627,"https://salsa.debian.org/systemd-team/casync","https://github.com/systemd/casync",2466.7584606482,38,15,0,44,38,0,0,69,1,"1",1.28301886792453,1.55072463768116,-0.629491448774217,1.24528094728907,1,1,0 +"catcodec",-1.1685609799,1.0772762213,-1.6183880518,"https://salsa.debian.org/openttd-team/catcodec","https://github.com/OpenTTD/catcodec.git",4292.8177314815,2,4,0,3,2,0,0,3,3,"3",1.66666666666667,1.66666666666667,0.626578778030573,1.29099444873581,1,0,0 +"catimg",-0.0953582269,2.1605928046,-0.6844708001,"https://salsa.debian.org/debian/catimg","https://github.com/posva/catimg.git",3000.6790046296,7,14,0,12,58,0,0,58,2,"2",1.66666666666667,2,-0.262229712265295,1.4142135623731,1,1,0 +"caveexpress",-0.4341110971,0.5694718441,-0.5965828946,"https://salsa.debian.org/games-team/caveexpress","https://github.com/mgerhardy/caveexpress",2582.468125,2,6,0,4,11,0,3,14,1,"1",1.75,1.78571428571429,-0.549899583018651,1.33630620956212,1.21428571428571,1,0 +"Cavez-of-Phear-packaging",0.0722256397,3.4094980689,-0.7199285527,"https://github.com/haakonnessjoen/Cavez-of-Phear-packaging","https://github.com/haakonnessjoen/Cavez-of-Phear-packaging",23.0470601852,0,1,0,1,1,0,0,2,1,"1",2,1.5,-2.31041888746808,1.22474487139159,1,0,0 +"cbatticon",-0.6634198756,2.0334034925,-1.2638833309,"https://salsa.debian.org/debian/cbatticon","https://github.com/valr/cbatticon.git",4175.7122800926,3,25,0,19,61,0,2,63,3,"3",1.89285714285714,1.96825396825397,0.546026808422812,1.4029447488244,1.03174603174603,0,0 +"cbflib",0.9354285947,4.3539203092,-0.1929526206,"https://salsa.debian.org/science-team/cbflib","https://github.com/yayahjb/cbflib",5636.0790740741,1,18,0,8,16,0,0,18,4,"4",1.94736842105263,1.88888888888889,1.55055238951058,1.37436854187255,1,0,0 +"cbm",0.2175441651,1.9827159385,-0.3872945166,"https://salsa.debian.org/debian/cbm","https://github.com/resurrecting-open-source-projects/cbm",918.9922337963,1,3,0,2,11,0,0,12,1,"1",1.75,1.91666666666667,-1.69413546480087,1.38443731048635,1,0,0 +"ccbuild",-0.9629469603,0.1146367137,-1.3836463029,"https://salsa.debian.org/debian/ccbuild","https://github.com/bneijt/ccbuild.git",4764.8878703704,1,5,0,2,9,0,0,9,3,"3",1.83333333333333,2,0.951296193227815,1.4142135623731,1,1,0 +"cccc",1.1630655625,3.7723724067,0.0933849486,"https://salsa.debian.org/debian/cccc","https://github.com/sarnold/cccc",2703.0782638889,1,7,0,3,10,0,0,11,1,"1",1.875,1.90909090909091,-0.466936884639203,1.38169855941551,1,0,0 +"ccd2iso-debian",0.361667663,2.3145122267,-0.2829342926,"https://github.com/paulproteus/ccd2iso-debian","https://github.com/paulproteus/ccd2iso-debian",10.0830555556,1,1,0,2,1,0,0,3,1,"1",1.5,1.33333333333333,-2.31933628708128,1.15470053837925,1,0,0 +"cclive",0.3075023734,1.0246036879,-0.0680117934,"https://github.com/mogaal/cclive","https://github.com/mogaal/cclive",1632.909375,1,4,0,2,0,0,0,2,1,"1",1.8,1,-1.20306155510113,1,1,0,0 +"cd-discid",0.6925316992,3.3171474044,-0.0825478541,"https://github.com/taem/cd-discid/tree/deb","https://github.com/taem/cd-discid",2591.0086574074,2,2,0,3,8,0,0,9,1,"1",1.5,1.88888888888889,-0.544024905975391,1.37436854187255,1,1,0 +"cellwriter",1.0089121851,3.1682961137,-0.0123490019,"https://salsa.debian.org/debian/cellwriter","https://github.com/risujin/cellwriter",1174.0054050926,1,2,0,2,8,0,1,9,1,"1",1.66666666666667,1.88888888888889,-1.5187225102355,1.37436854187255,1.11111111111111,0,0 +"cen64-debian",-0.0299112832,2.2614422439,-0.6566748344,"https://github.com/dh4/cen64-debian/","https://github.com/dh4/cen64-debian",1926.2346064815,0,5,0,3,1,0,0,3,1,"1",2,1.33333333333333,-1.00129532772867,1.15470053837925,1,1,0 +"cen64-qt-debian",-0.752499837,1.4603763669,-1.3157313926,"https://github.com/dh4/cen64-qt-debian/","https://github.com/dh4/cen64-qt-debian",1637.4857986111,0,4,0,3,1,0,0,3,1,"1",2,1.33333333333333,-1.199913623632,1.15470053837925,1,1,0 +"centreon-clib",-3.2868334023,-0.8614963308,-3.7498045046,"https://salsa.debian.org/centreon-team/centreon-clib","https://github.com/centreon/centreon-clib.git",4179.8511458333,9,17,0,12,14,0,0,16,3,"3",1.65384615384615,1.875,0.548873762030875,1.36930639376292,1,1,0 +"certspotter",-1.0333689914,-0.0755768851,-1.2332167803,"https://salsa.debian.org/go-team/packages/certspotter","https://github.com/sslmate/certspotter",2838.7901736111,7,8,2,11,9,0,0,16,2,"2",1.53333333333333,1.5625,-0.373586306184493,1.25,1,0,0 +"CeWL",-0.0142294382,1.8140197076,-0.3642449144,"https://salsa.debian.org/pkg-security-team/cewl","https://github.com/digininja/CeWL.git",2751.2389351852,7,13,0,13,22,0,0,31,2,"2",1.65,1.70967741935484,-0.433809161851426,1.30754633545234,1,1,0 +"cgroupfs-mount",0.5950079509,2.246233345,0.0389645239,"https://github.com/tianon/cgroupfs-mount","https://github.com/tianon/cgroupfs-mount",2931.2437847222,0,7,0,5,13,0,0,15,2,"2",2,1.86666666666667,-0.309991312236543,1.36626010212795,1,1,0 +"chafa",0.2729454746,2.5277999875,-0.1637443656,"https://salsa.debian.org/debian/chafa","https://github.com/hpjansson/chafa.git",2095.0478819445,25,6,0,27,29,0,1,49,1,"1",1.19354838709677,1.59183673469388,-0.885175696462976,1.26168012376112,1.02040816326531,1,0 +"Chaosreader",0.051219731,1.9660310042,-0.36928528,"https://salsa.debian.org/pkg-security-team/chaosreader","https://github.com/brendangregg/Chaosreader",66.7731134259,0,4,0,3,13,0,0,13,1,"1",2,2,-2.28034155400548,1.4142135623731,1,0,0 +"charls",0.0895204966,0.7433078443,-0.0746073455,"https://salsa.debian.org/med-team/charls","https://github.com/team-charls/charls.git",5412.7639236111,9,14,0,14,20,0,2,29,4,"4",1.60869565217391,1.68965517241379,1.39694318515929,1.29986736723936,1.06896551724138,0,0 +"cjk",0.9697104519,1.6795645993,0.5078842706,"https://github.com/debian-tex/cjk","https://github.com/debian-tex/cjk",4969.9469328704,1,7,0,4,2,0,0,4,3,"3",1.875,1.5,1.09234779393802,1.22474487139159,1,0,0 +"cjose",0.2954038942,3.3240815436,-0.6206035693,"https://salsa.debian.org/debian/cjose","https://github.com/zmartzone/cjose.git",2698.734525463,9,16,0,16,4,0,0,17,1,"1",1.64,1.23529411764706,-0.469924761646782,1.11143786045242,1,1,1 +"cjs",0.3334254948,1.2158627921,-0.0031931609,"https://salsa.debian.org/cinnamon-team/cjs","https://github.com/linuxmint/cjs.git",3771.5652546296,71,77,0,93,33,0,0,114,3,"3",1.52027027027027,1.28947368421053,0.268030878036535,1.13554994791534,1,1,1 +"ckbuilder",-1.3486815873,1.7603160909,-2.1472801921,"https://salsa.debian.org/js-team/ckbuilder","https://github.com/ckeditor/ckbuilder.git",3366.2307291667,1,11,0,10,31,0,0,31,2,"2",1.91666666666667,2,-0.0107818842116823,1.4142135623731,1,1,0 +"cl-csv",-0.1843136147,2.282501642,-0.9607356223,"https://salsa.debian.org/common-lisp-team/cl-csv","https://github.com/AccelerationNet/cl-csv",3373.8361342593,0,10,0,9,30,0,0,30,2,"2",2,2,-0.00555044235643239,1.4142135623731,1,1,0 +"cl-ftp",-0.6205750271,2.0407172858,-1.4348634933,"https://github.com/pinterface/cl-ftp","https://github.com/pinterface/cl-ftp",3252.9678009259,1,3,0,2,5,0,0,6,2,"2",1.75,1.83333333333333,-0.0886907419559736,1.35400640077266,1,0,0 +"cl-github-v3",-0.5258867542,3.1486982913,-1.5778685827,"https://github.com/hanshuebner/cl-github-v3","https://github.com/hanshuebner/cl-github-v3",2986.6350810185,1,3,0,2,3,0,0,3,2,"2",1.75,2,-0.271889943232154,1.4142135623731,1,1,0 +"ironclad",-0.2926194741,2.5462973619,-0.9228966528,"https://salsa.debian.org/common-lisp-team/cl-ironclad","https://github.com/sharplispers/ironclad",5005.7061458333,20,31,0,38,63,0,0,79,4,"4",1.6078431372549,1.79746835443038,1.11694506931352,1.34069696592123,1,0,0 +"lparallel",-0.3212127102,2.5346068068,-1.0978335516,"https://github.com/lmj/lparallel","https://github.com/lmj/lparallel",2019.918599537,0,5,0,4,49,0,0,49,1,"1",2,2,-0.936854005212618,1.4142135623731,1,1,0 +"cl-markdown",-0.704735028,1.4518477641,-1.1406727407,"https://github.com/gwkkwg/cl-markdown","https://github.com/gwkkwg/cl-markdown",5675.8904513889,2,4,0,3,15,0,0,16,4,"4",1.66666666666667,1.9375,1.57793698021469,1.39194109070751,1,0,0 +"debian-coinor-ipopt",0.5832138621,1.8467840552,-0.023431241,"https://github.com/ghorn/debian-coinor-ipopt.git","https://github.com/ghorn/debian-coinor-ipopt.git",39.8457986111,1,2,0,3,6,0,0,7,1,"1",1.66666666666667,1.85714285714286,-2.29886373396257,1.36277028773849,1,0,0 +"coinst",-2.1191156396,-0.1758133987,-2.7007167402,"https://salsa.debian.org/ocaml-team/coinst","https://github.com/vouillon/coinst",2037.998599537,0,10,0,3,4,0,0,5,1,"1",2,1.8,-0.924417525157802,1.34164078649987,1,1,0 +"CoinUtils",0.5173058529,1.7235167137,0.083670866,"https://salsa.debian.org/science-team/coinutils","https://github.com/coin-or/CoinUtils",5778.8880671296,5,20,0,19,32,0,0,42,4,"4",1.8,1.76190476190476,1.64878475642336,1.32736760616822,1,1,0 +"collada-dom",0.691454203,3.6624920638,-0.1343215008,"https://salsa.debian.org/science-team/collada-dom","https://github.com/rdiankov/collada-dom",2502.5084606482,0,12,0,6,37,0,0,37,1,"1",2,2,-0.60490051061273,1.4142135623731,1,0,0 +"colord-gtk",0.7697552931,2.9826639125,0.077041879,"https://salsa.debian.org/debian/colord-gtk","https://github.com/hughsie/colord-gtk.git",4151.4261111111,7,4,0,8,20,0,0,21,3,"3",1.36363636363636,1.95238095238095,0.529321362839498,1.39727626201154,1,0,0 +"Colormake",0.4957489072,1.6979687579,-0.1003336178,"https://salsa.debian.org/debian/colormake","https://github.com/pagekite/Colormake",1830.1740162037,0,12,0,7,19,0,0,20,1,"1",2,1.95,-1.06737141263153,1.39642400437689,1,1,0 +"colorspacious",-0.5821614466,2.0041319598,-1.1596382365,"https://salsa.debian.org/python-team/packages/colorspacious","https://github.com/njsmith/colorspacious.git",1894.8289351852,2,10,0,9,30,0,0,33,1,"1",1.83333333333333,1.90909090909091,-1.02289798285503,1.38169855941551,1,0,0 +"terminal-colors",-0.3857845184,0.9188572345,-0.8063133571,"https://salsa.debian.org/python-team/packages/colortest-python","https://github.com/eikenb/terminal-colors",4692.3352777778,1,2,0,2,11,0,0,11,3,"3",1.66666666666667,2,0.9013902822376,1.4142135623731,1,1,0 +"ColPack",0.2017867043,1.9302260292,-0.3695903388,"https://salsa.debian.org/science-team/colpack","https://github.com/CSCsw/ColPack",1916.7757175926,1,22,0,9,0,0,0,9,1,"1",1.95652173913043,1,-1.00780170400121,1,1,1,0 +"CommonMark-py",-0.1141650084,1.2511686194,-0.3702327483,"https://salsa.debian.org/python-team/packages/commonmark-bkrs","https://github.com/rolandshoemaker/CommonMark-py",472.4580902778,0,5,0,4,23,0,0,24,1,"1",2,1.95833333333333,-2.00128773082201,1.39940463531222,1,1,0 +"concordance",-0.4625050573,0.3139503984,-0.7573354842,"https://salsa.debian.org/debian/concordance","https://github.com/jaymzh/concordance.git",5701.1186458333,1,3,0,2,16,0,0,16,4,"4",1.75,2,1.5952904059352,1.4142135623731,1,0,0 +"config-package-dev",-0.2056225256,1.2522724234,-0.6633860362,"https://github.com/sipb/config-package-dev","https://github.com/sipb/config-package-dev",3585.0969444445,4,6,0,9,9,0,0,16,2,"2",1.6,1.5625,0.13976708265643,1.25,1,0,0 +"ssh-connect",0.6639299634,3.4943269761,-0.2623886668,"https://salsa.debian.org/debian/connect-proxy","https://github.com/gotoh/ssh-connect",3911.0326273148,0,6,0,3,7,0,0,9,3,"3",2,1.77777777777778,0.363964683274206,1.33333333333333,1,0,0 +"conserver",-0.5522688783,0.0570588023,-0.8821891544,"https://salsa.debian.org/debian/conserver","https://github.com/conserver/conserver.git",4671.668912037,1,15,0,9,21,0,0,23,3,"3",1.9375,1.91304347826087,0.88717474875635,1.38312814961625,1,0,0 +"constantly",0.8509284475,3.7618528736,0.0151388634,"https://salsa.debian.org/python-team/packages/constantly","https://github.com/twisted/constantly.git",2708.6915162037,2,14,0,8,30,0,0,30,1,"1",1.875,2,-0.46307576182639,1.4142135623731,1,0,0 +"context",0.3449326884,0.8438807473,0.0662940568,"https://github.com/debian-tex/context","https://github.com/debian-tex/context",5666.6297800926,2,10,0,4,3,0,0,4,4,"4",1.83333333333333,1.75,1.57156694958025,1.3228756555323,1,0,0 +"context-modules",0.2805651463,2.5200169996,-0.1441758839,"https://github.com/debian-tex/context-modules","https://github.com/debian-tex/context-modules",4444.3460763889,3,7,0,4,3,0,0,4,3,"3",1.7,1.75,0.730808824445406,1.3228756555323,1,0,0 +"context-free",-0.3442355768,0.7562945788,-0.8321584754,"https://github.com/MtnViewJohn/context-free","https://github.com/MtnViewJohn/context-free",2911.319537037,1,9,0,3,27,0,9,36,2,"2",1.9,1.75,-0.323696373571952,1.3228756555323,1.25,0,0 +"ConvertAll",0.1771895993,1.8709004223,-0.3855879122,"https://salsa.debian.org/qt-kde-team/extras/convertall","https://github.com/doug-101/ConvertAll.git",72.0215277778,1,2,0,1,0,0,0,1,1,"1",1.66666666666667,1,-2.27673138805378,1,1,0,0 +"convertdate",-1.0779704926,1.5263503581,-1.6372696683,"https://salsa.debian.org/python-team/packages/convertdate","https://github.com/fitnr/convertdate",2873.5651041667,10,11,0,11,44,0,0,45,2,"2",1.52380952380952,1.97777777777778,-0.349666077740779,1.40633487398193,1,1,0 +"project--copyright-update",-0.5521971605,1.8066389929,-1.1431761187,"https://salsa.debian.org/debian/copyright-update","https://github.com/jaalto/project--copyright-update",3367.8622453704,0,1,0,1,0,0,0,1,2,"2",2,1,-0.00965963206973375,1,1,0,0 +"core.cache",-0.5610215639,2.4088514058,-1.3030738883,"https://salsa.debian.org/clojure-team/core-cache-clojure","https://github.com/clojure/core.cache",4284.5170138889,8,15,0,13,17,0,18,44,3,"3",1.65217391304348,1.38636363636364,0.620869059624542,1.17743944063533,1.40909090909091,1,1 +"cruft",1.801661645,2.7360925805,1.1501879975,"https://github.com/a-detiste/cruft","https://github.com/a-detiste/cruft",5211.5065740741,2,8,0,7,3,0,0,7,4,"4",1.8,1.42857142857143,1.25850662468351,1.19522860933439,1,0,0 +"cruft-ng",0.142059124,2.3097088035,-0.5171739502,"https://github.com/a-detiste/cruft-ng","https://github.com/a-detiste/cruft-ng",3368.4031018519,2,10,0,10,11,0,1,13,2,"2",1.83333333333333,1.84615384615385,-0.00928759939027082,1.35873244097351,1.07692307692308,1,0 +"cryfs",-0.1323512993,0.8693806221,-0.3694530273,"https://github.com/davesteele/cryfs","https://github.com/davesteele/cryfs",3180.9594560185,28,15,0,27,1,0,0,27,2,"2",1.34883720930233,1.03703703703704,-0.13822228759874,1.01835015443463,1,1,0 +"CTDConverter",-2.8525515304,-0.4549866674,-3.3207596251,"https://salsa.debian.org/med-team/ctdconverter","https://github.com/WorkflowConversion/CTDConverter",2616.9146180556,5,13,0,9,15,0,0,15,1,"1",1.72222222222222,2,-0.526205273071508,1.4142135623731,1,1,0 +"cupt",-0.7851662489,-0.7413560004,-0.8102098137,"https://github.com/jackyf/cupt/tree/master","https://github.com/jackyf/cupt",3964.469525463,4,7,0,6,9,0,1,14,3,"3",1.63636363636364,1.64285714285714,0.400721703075719,1.28173988892331,1.07142857142857,0,0 +"curvedns",-1.1461706987,0.1127414426,-1.3738129892,"https://salsa.debian.org/pkg-security-team/curvedns","https://github.com/curvedns/curvedns.git",3466.7757291667,0,3,0,2,9,0,0,9,2,"2",2,2,0.0583788396329803,1.4142135623731,1,1,0 +"cwm",-0.5002044281,1.5042184567,-0.9352825389,"https://github.com/jamesmcdonald/cwm","https://github.com/jamesmcdonald/cwm",5679.8960532407,1,30,0,0,1,0,0,1,4,"4",1.96774193548387,2,1.58069226713601,1.4142135623731,1,0,0 +"cycle",-0.313126049,0.6954651903,-0.7844178818,"https://salsa.debian.org/med-team/cycle","https://github.com/metlov/cycle.git",229.9525347222,0,1,0,1,0,0,0,1,1,"1",2,1,-2.16809721670969,1,1,1,0 +"project--perl-ddir",-0.9126372061,1.4246841106,-1.4714839475,"https://salsa.debian.org/debian/ddir","https://github.com/jaalto/project--perl-ddir.git",3338.2834722222,0,1,0,1,2,0,0,2,2,"2",2,2,-0.0300056399405039,1.4142135623731,1,0,0 +"debomatic",-0.8158097197,-0.1371156791,-1.0821998073,"https://salsa.debian.org/python-team/packages/debomatic","https://github.com/debomatic/debomatic",5739.495,4,16,0,13,18,0,0,22,4,"4",1.8,1.81818181818182,1.62168790389818,1.34839972492648,1,0,0 +"debootstick",-0.5087170385,0.8382307544,-0.8815589055,"https://github.com/drakkar-lig/debootstick","https://github.com/drakkar-lig/debootstick",3036.0772106482,5,8,0,8,20,0,2,23,2,"2",1.61538461538462,1.8695652173913,-0.237880758552541,1.36732045161012,1.08695652173913,1,0 +"debian-debuerreotype",-1.063173434,1.4648781183,-1.6297873496,"https://github.com/debuerreotype/debian-debuerreotype","https://github.com/debuerreotype/debian-debuerreotype",2712.8558217593,0,4,0,2,2,0,0,3,1,"1",2,1.66666666666667,-0.460211309227696,1.29099444873581,1,0,0 +"deepin-notifications",0.3474442725,3.6547785603,-0.4321808993,"https://salsa.debian.org/pkg-deepin-team/deepin-notifications","https://github.com/linuxdeepin/deepin-notifications",2025.0469791667,4,26,0,14,18,0,0,30,1,"1",1.86666666666667,1.6,-0.933326406154084,1.26491106406735,1,1,0 +"dicteval",-2.9536986334,-0.1320875709,-3.6889555809,"https://salsa.debian.org/debian/dicteval","https://github.com/osantana/dicteval.git",1110.6433217593,3,12,0,10,14,0,0,14,1,"1",1.8,2,-1.56230665213849,1.4142135623731,1,0,1 +"ding-libs",0.3833422556,2.4936424716,-0.1381470129,"https://salsa.debian.org/sssd-team/ding-libs","https://github.com/SSSD/ding-libs",5249.6200810185,15,12,0,14,16,0,0,23,4,"4",1.44444444444444,1.69565217391304,1.28472332097406,1.30217209842365,1,0,0 +"dir2ogg",0.2396946845,1.641521491,-0.3190929184,"https://github.com/julian-klode/dir2ogg","https://github.com/julian-klode/dir2ogg",1310.0299884259,1,5,1,3,9,0,0,10,1,"1",1.83333333333333,1.9,-1.42515685660777,1.37840487520902,1,1,0 +"direnv-deb",-0.006884838,1.7585706473,-0.4511605857,"https://github.com/direnv/direnv-deb","https://github.com/direnv/direnv-deb",3256.5212847222,1,6,0,1,1,0,0,2,2,"2",1.85714285714286,1.5,-0.0862464482414936,1.22474487139159,1,1,0 +"node-dirty",-0.8909885733,2.6227016495,-1.9512157567,"https://salsa.debian.org/js-team/dirty.js","https://github.com/felixge/node-dirty.git",4940.3282175926,7,21,0,20,52,0,0,53,3,"3",1.75,1.9811320754717,1.07197431153749,1.40752693596666,1,1,0 +"discus",1.1705020939,3.7454601144,0.0821077036,"https://salsa.debian.org/debian/discus","https://github.com/ncarrier/discus.git",1119.0192592593,0,4,0,1,3,0,0,3,1,"1",2,2,-1.55654519308655,1.4142135623731,1,1,0 +"diskscan",-0.2808442196,0.3836383801,-0.4193484695,"https://salsa.debian.org/debian/diskscan","https://github.com/baruch/diskscan.git",1436.448587963,0,3,0,3,32,0,0,32,1,"1",2,2,-1.33819875972166,1.4142135623731,1,1,0 +"ditaa",1.1445611741,3.5538586753,0.1428331298,"https://salsa.debian.org/java-team/ditaa","https://github.com/stathissideris/ditaa",4647.8960416667,3,17,0,12,73,0,0,74,3,"3",1.85,1.98648648648649,0.870822379939648,1.40942771594945,1,1,0 +"dizzy",0.5207937556,2.8020455015,-0.2161435151,"https://salsa.debian.org/perl-team/modules/packages/dizzy","https://github.com/penma/dizzy.git",1717.3470949074,4,6,0,4,1,0,0,5,1,"1",1.6,1.2,-1.14498035933218,1.09544511501033,1,0,0 +"django-bitfield",-1.1647703491,1.6767739512,-1.9098342392,"https://salsa.debian.org/python-team/packages/django-bitfield","https://github.com/disqus/django-bitfield",4482.6217939815,15,33,0,35,84,0,0,98,3,"3",1.6875,1.85714285714286,0.757137098694529,1.36277028773849,1,0,0 +"django-cas-server",-1.308896058,2.2292815551,-2.3158506417,"https://salsa.debian.org/python-team/packages/django-cas-server","https://github.com/nitmir/django-cas-server.git",3041.6335532407,8,9,0,13,46,0,0,47,2,"2",1.52941176470588,1.97872340425532,-0.234058781570829,1.4066710362609,1,0,0 +"pkg-django-compat",-1.3241602951,-0.1886083427,-1.7657341927,"https://github.com/Linaro/pkg-django-compat.git","https://github.com/Linaro/pkg-django-compat.git",1206.0878819445,0,6,0,3,3,0,0,3,1,"1",2,2,-1.49665430871571,1.4142135623731,1,0,0 +"django-cors-headers",-1.1139410876,0.0671040287,-1.3367389103,"https://salsa.debian.org/python-team/packages/django-cors-headers","https://github.com/adamchainz/django-cors-headers",3979.5858333333,47,28,0,63,10,0,0,66,3,"3",1.37333333333333,1.15151515151515,0.411119582574139,1.07308673997732,1,0,0 +"django-guardian",-0.6318405623,-0.1756665381,-0.763973424,"https://salsa.debian.org/python-team/packages/django-guardian","https://github.com/lukaszb/django-guardian",4311.9324074074,74,100,0,127,8,0,0,133,3,"3",1.57471264367816,1.06015037593985,0.639726968622759,1.02963604052104,1,0,0 +"pkg-django-restricted-resource",-1.2869731875,0.2279132109,-1.7519542903,"https://github.com/Linaro/pkg-django-restricted-resource","https://github.com/Linaro/pkg-django-restricted-resource",3194.8619212963,0,7,0,4,3,0,0,5,2,"2",2,1.6,-0.128659359936122,1.26491106406735,1,0,0 +"django-reversion",-0.777150964,0.9983388355,-1.4152875579,"https://salsa.debian.org/python-team/packages/django-reversion","https://github.com/etianen/django-reversion.git",5522.8556828704,31,173,0,144,17,0,14,167,4,"4",1.84803921568627,1.10179640718563,1.47267072764977,1.04966490233104,1.08383233532934,0,0 +"django-setuptest",-1.0039883027,1.8917399808,-1.7398796439,"https://salsa.debian.org/python-team/packages/django-setuptest","https://github.com/praekelt/django-setuptest.git",1589.0550810185,0,22,0,14,37,0,0,38,1,"1",2,1.97368421052632,-1.23322710003581,1.40487871737254,1,0,0 +"pkg-django-testproject",-0.7999395109,1.6435435249,-1.4494523946,"https://github.com/Linaro/pkg-django-testproject","https://github.com/Linaro/pkg-django-testproject",3196.2780324074,0,5,0,3,4,0,0,4,2,"2",2,2,-0.127685275998699,1.4142135623731,1,0,0 +"pkg-django-testscenarios",-1.3257146932,-0.0322578006,-1.6658090716,"https://github.com/Linaro/pkg-django-testscenarios","https://github.com/Linaro/pkg-django-testscenarios",3196.2901157408,0,7,0,4,5,0,0,5,2,"2",2,2,-0.127676964376198,1.4142135623731,1,0,0 +"django-xmlrpc",-1.0500707985,0.6741579236,-1.5157519079,"https://salsa.debian.org/python-team/packages/django-xmlrpc","https://github.com/Fantomas42/django-xmlrpc",2632.3087384259,1,5,0,2,8,0,0,8,1,"1",1.83333333333333,2,-0.515616297908528,1.4142135623731,1,0,0 +"dmarc-cat",-0.1483894393,3.3771756375,-1.1901233623,"https://salsa.debian.org/go-team/packages/dmarc-cat","https://github.com/keltia/dmarc-cat.git",1521.7803009259,0,4,0,3,19,0,0,19,1,"1",2,2,-1.27950262331091,1.4142135623731,1,1,0 +"dms",-1.7923560941,0.9490139495,-3.0040589667,"https://github.com/grantma/dms","https://github.com/grantma/dms",1425.0333101852,0,7,0,1,0,0,0,1,1,"1",2,1,-1.34605085454488,1,1,0,0 +"dnstap-ldns",-1.9630028548,0.4908382481,-2.5788124384,"https://salsa.debian.org/dns-team/dnstap-ldns","https://github.com/dnstap/dnstap-ldns.git",2977.0303009259,3,7,0,5,6,0,0,7,2,"2",1.7,1.85714285714286,-0.27849667199612,1.36277028773849,1,1,0 +"dnswalk",1.9006613427,5.3064955884,0.5879892736,"https://salsa.debian.org/debian/dnswalk","https://github.com/davebarr/dnswalk.git",3790.9134837963,0,2,0,2,5,0,0,5,3,"3",2,2,0.281339720189614,1.4142135623731,1,0,0 +"docdiff",-0.3637756064,0.6895030349,-0.723612814,"https://salsa.debian.org/debian/docdiff","https://github.com/hisashim/docdiff",3912.6548148148,0,6,1,5,11,0,2,13,3,"3",2,1.84615384615385,0.365080518588859,1.35873244097351,1.15384615384615,0,0 +"Droopy",-0.8939869433,1.3787169177,-1.3337026104,"https://salsa.debian.org/debian/droopy","https://github.com/stackp/Droopy.git",5280.2147685185,0,7,0,4,33,0,0,33,4,"4",2,2,1.30576813407567,1.4142135623731,1,0,0 +"drumkv1",-0.1956463038,1.0706720909,-0.4594280916,"https://salsa.debian.org/multimedia-team/drumkv1","https://github.com/rncbc/drumkv1.git",4115.9090277778,1,13,0,4,23,0,1,24,3,"3",1.92857142857143,1.95833333333333,0.504890638366056,1.39940463531222,1.04166666666667,0,0 +"dtach",0.4720927384,2.0532258223,-0.05646356,"https://salsa.debian.org/voelkel-guest/dtach","https://github.com/crigler/dtach.git",1708.1544328704,2,2,0,3,25,0,0,26,1,"1",1.5,1.96153846153846,-1.15130360922565,1.40054934277178,1,0,0 +"dtfabric",0.0544342308,2.3417288031,-0.4793676181,"https://salsa.debian.org/debian/dtfabric","https://github.com/libyal/dtfabric.git",2597.9576388889,0,1,0,1,6,0,1,7,1,"1",2,1.85714285714286,-0.539244990621632,1.36277028773849,1.14285714285714,0,0 +"dumpet",0.8119567162,4.8329646447,-0.595687567,"https://salsa.debian.org/debian/dumpet","https://github.com/rhboot/dumpet.git",4953.9319097222,2,5,0,3,2,0,0,4,3,"3",1.71428571428571,1.5,1.0813317255774,1.22474487139159,1,0,0 +"dvbcut-deb",-0.140015948,0.3995494726,-0.3603098157,"https://github.com/bernhardu/dvbcut-deb","https://github.com/bernhardu/dvbcut-deb",2301.5843402778,21,3,0,13,12,0,0,21,1,"1",1.125,1.57142857142857,-0.743107856603769,1.25356634105602,1,0,0 +"dvisvgm",0.1719982822,1.5508413641,-0.14266231,"https://github.com/debian-tex/dvisvgm","https://github.com/debian-tex/dvisvgm",1541.3238194445,1,6,0,3,2,0,0,3,1,"1",1.85714285714286,1.66666666666667,-1.26605944973472,1.29099444873581,1,1,0 +"dymo-cups-drivers",0.1695490981,1.2653423504,-0.0340436611,"https://salsa.debian.org/printing-team/dymo-cups-drivers","https://github.com/matthiasbock/dymo-cups-drivers",4079.6409837963,4,11,0,5,30,0,0,31,3,"3",1.73333333333333,1.96774193548387,0.479943359295087,1.40276225194574,1,1,0 +"e2tools",-0.3154826477,0.572945917,-0.5928968266,"https://salsa.debian.org/debian/e2tools","https://github.com/e2tools/e2tools",1196.5083217593,2,6,3,6,14,0,0,16,1,"1",1.75,1.875,-1.50324368975427,1.36930639376292,1,1,0 +"easygit",0.383586011,3.5957594474,-0.5807571227,"https://salsa.debian.org/debian/easygit","https://github.com/newren/easygit",3676.0657175926,399,15,0,318,0,0,0,318,2,"2",1.03623188405797,1,0.202340718323878,1,1,0,0 +"easyprocess",-0.5379917332,1.9459970198,-1.0219432067,"https://salsa.debian.org/python-team/packages/easyprocess","https://github.com/ponty/easyprocess.git",4652.3978009259,3,9,0,6,23,0,0,23,3,"3",1.75,2,0.873918952906386,1.4142135623731,1,1,0 +"ecdsautils",-0.5842189084,1.6112758398,-1.017052069,"https://salsa.debian.org/communitywlan-team/ecdsautils","https://github.com/freifunk-gluon/ecdsautils",3436.625625,1,8,0,5,0,0,0,5,2,"2",1.88888888888889,1,0.0376398369161776,1,1,1,0 +"edbrowse",0.3708322115,1.5829127394,-0.1941202595,"https://salsa.debian.org/a11y-team/edbrowse","https://github.com/CMB/edbrowse.git",5783.5197453704,9,22,0,20,30,0,10,47,4,"4",1.70967741935484,1.63829787234043,1.65197069525423,1.27996010576128,1.21276595744681,0,0 +"emacs-python-environment",-0.6497796464,0.8881585898,-0.9254847969,"https://salsa.debian.org/emacsen-team/emacs-python-environment","https://github.com/tkf/emacs-python-environment.git",626.8352777778,0,3,0,3,12,0,0,12,1,"1",2,2,-1.89509808407077,1.4142135623731,1,0,0 +"engauge_debian",0.4683184378,1.884463339,-0.1321998122,"https://github.com/winchen/engauge_debian","https://github.com/winchen/engauge_debian",3059.1429976852,0,6,0,2,1,0,0,2,2,"2",2,1.5,-0.222014762953299,1.22474487139159,1,1,0 +"enjarify",0.4273596447,3.1508079803,-0.3690926561,"https://salsa.debian.org/android-tools-team/enjarify","https://github.com/Storyyeller/enjarify",1738.1109490741,3,12,0,10,26,0,0,30,1,"1",1.8,1.86666666666667,-1.13069776761729,1.36626010212795,1,1,0 +"entrypoints",0.857419697,4.1047834353,0.0074721981,"https://salsa.debian.org/python-team/packages/entrypoints","https://github.com/takluyver/entrypoints",2468.1372569445,5,10,0,10,52,0,0,52,1,"1",1.66666666666667,2,-0.628543032145976,1.4142135623731,1,0,0 +"enzyme",0.2209281122,2.7508227467,-0.5362781772,"https://salsa.debian.org/python-team/packages/enzyme","https://github.com/Diaoul/enzyme",665.1386111111,0,3,0,2,20,0,0,20,1,"1",2,2,-1.86875081410216,1.4142135623731,1,0,0 +"epoptes",-0.5424519728,0.3737235027,-0.8396779959,"https://github.com/epoptes/epoptes","https://github.com/epoptes/epoptes",4351.4067939815,4,10,0,8,6,0,0,11,3,"3",1.71428571428571,1.54545454545455,0.666879757411747,1.24316312101612,1,1,0 +"epr-api",-0.1835594424,2.5490628716,-0.8931266505,"https://salsa.debian.org/debian-gis-team/epr-api","https://github.com/bcdev/epr-api",4843.1898611111,0,19,0,7,3,0,0,8,3,"3",2,1.375,1.00515687608728,1.17260393995586,1,0,0 +"erfa",0.2626332321,2.3178268988,-0.1835083824,"https://salsa.debian.org/debian-astro-team/erfa","https://github.com/liberfa/erfa",3687.0853240741,3,14,0,13,25,0,0,29,2,"2",1.82352941176471,1.86206896551724,0.209920647318297,1.36457647844203,1,0,0 +"eris",-0.632476633,0.6133940856,-1.1993507243,"https://salsa.debian.org/games-team/eris","https://github.com/worldforge/eris",5633.2405092593,2,7,0,8,6,0,0,10,4,"4",1.77777777777778,1.6,1.54859985883007,1.26491106406735,1,1,0 +"bear",-1.5598707008,0.7740571851,-2.0549566735,"https://salsa.debian.org/erlang-team/packages/erlang-bear","https://github.com/boundary/bear.git",985.0124652778,0,11,0,6,17,0,0,17,1,"1",2,2,-1.64872289333881,1.4142135623731,1,1,0 +"cuttlefish",-1.1570169301,1.4079371161,-1.9722441303,"https://salsa.debian.org/erlang-team/packages/erlang-cuttlefish","https://github.com/Kyorai/cuttlefish.git",3504.2075115741,6,42,0,29,12,0,17,51,2,"2",1.875,1.23529411764706,0.0841266059673747,1.11143786045242,1.33333333333333,1,0 +"getopt",-1.2464014688,1.2405525277,-1.7527351047,"https://salsa.debian.org/erlang-team/packages/erlang-getopt","https://github.com/jcomellas/getopt",5121.0564583333,4,19,0,16,31,0,0,33,4,"4",1.82608695652174,1.93939393939394,1.19628975187564,1.39262124764558,1,1,0 +"extrace",-0.716911996,1.6418001527,-1.2621214591,"https://salsa.debian.org/debian/extrace","https://github.com/chneukirchen/extrace",3149.892662037,4,2,0,5,5,0,0,6,2,"2",1.33333333333333,1.83333333333333,-0.159591843114116,1.35400640077266,1,0,0 +"eyeD3-debian",1.2363220835,2.3225067373,0.5919861745,"https://github.com/gaetano-guerriero/eyeD3-debian","https://github.com/gaetano-guerriero/eyeD3-debian",2546.8571180556,1,6,0,1,2,0,0,3,1,"1",1.85714285714286,1.66666666666667,-0.574394913637896,1.29099444873581,1,0,0 +"faac",0.4086376314,1.7882056088,-0.0272312251,"https://salsa.debian.org/multimedia-team/faac","https://github.com/knik0/faac",5409.5071180556,6,12,0,10,30,0,0,30,4,"4",1.66666666666667,2,1.39470296406784,1.4142135623731,1,0,0 +"faad2",1.0544175056,2.2339624185,0.4716640534,"https://salsa.debian.org/multimedia-team/faad2","https://github.com/knik0/faad2.git",5741.3708333333,16,14,0,22,44,0,0,49,4,"4",1.46666666666667,1.89795918367347,1.62297821163246,1.37766439442757,1,0,0 +"faba-icon-theme",0.8911212387,4.4384740676,-0.1142443813,"https://github.com/ubuntubudgie/faba-icon-theme/tree/debian","https://github.com/ubuntubudgie/faba-icon-theme",1592.9366782407,0,6,0,2,0,0,0,2,1,"1",2,1,-1.23055711074185,1,1,1,0 +"fabulous",-1.9004216273,-0.0667224502,-2.4935029916,"https://salsa.debian.org/python-team/packages/fabulous","https://github.com/jart/fabulous.git",4223.1852546296,4,8,0,7,25,5,0,30,3,"3",1.66666666666667,1.83333333333333,0.578681493211098,1.35400640077266,1,0,0 +"fadecut",-0.6673500925,1.8538364578,-1.1385440983,"https://github.com/fadecut/fadecut/tree/debian","https://github.com/fadecut/fadecut",2792.815474537,1,14,5,2,11,0,1,12,2,"2",1.93333333333333,1.91666666666667,-0.405210389594958,1.38443731048635,1.08333333333333,1,0 +"fai",-0.1410290031,-0.0834131887,-0.1875070234,"https://github.com/faiproject/fai","https://github.com/faiproject/fai",5773.004537037,75,16,0,54,6,0,0,57,4,"4",1.17582417582418,1.10526315789474,1.64473772076802,1.05131496607569,1,0,0 +"fakesleep",-2.4812653648,0.0741874264,-3.0028931926,"https://salsa.debian.org/python-team/packages/fakesleep","https://github.com/wearpants/fakesleep",0.0144907407,0,1,0,1,3,0,0,3,1,"1",2,2,-2.32626203406696,1.4142135623731,1,0,0 +"fastd",0.3335142219,3.127871508,-0.5170005596,"https://salsa.debian.org/communitywlan-team/fastd","https://github.com/NeoRaider/fastd.git",4199.101087963,7,5,0,10,31,0,1,35,3,"3",1.41666666666667,1.88571428571429,0.56211499661895,1.37321312465119,1.02857142857143,1,0 +"ft2-clone",-1.4004624291,1.3055702677,-2.1338147005,"https://salsa.debian.org/multimedia-team/fasttracker2","https://github.com/8bitbubsy/ft2-clone",1461.1673958333,1,7,0,7,46,0,0,46,1,"1",1.875,2,-1.32119571984014,1.4142135623731,1,1,0 +"fastx_toolkit",-0.3457886057,1.0929975464,-0.7809122121,"https://salsa.debian.org/med-team/fastx-toolkit","https://github.com/agordon/fastx_toolkit.git",3133.6998726852,1,6,0,3,38,0,0,39,2,"2",1.85714285714286,1.97435897435897,-0.170730189452916,1.40511884705849,1,0,0 +"fatcat",0.4842442346,3.2701121154,-0.2692644397,"https://salsa.debian.org/pkg-security-team/fatcat","https://github.com/gregwar/fatcat",3248.5118981482,2,7,0,6,33,0,0,33,2,"2",1.77777777777778,2,-0.0917557721562538,1.4142135623731,1,1,0 +"fatresize",1.7814820731,4.9928976784,0.5330410517,"https://salsa.debian.org/parted-team/fatresize","https://github.com/ya-mouse/fatresize",2189.5325,0,6,0,4,33,0,0,33,1,"1",2,2,-0.820183657307326,1.4142135623731,1,0,0 +"fbpager",1.5882380186,4.0001262231,0.5019616446,"https://salsa.debian.org/debian/fbpager","https://github.com/fluxbox/fbpager",37.6531828704,0,2,0,1,2,0,0,3,1,"1",2,1.66666666666667,-2.30037194313995,1.29099444873581,1,0,0 +"fbset",1.3134317762,2.3999244161,0.6559617709,"https://github.com/sudipm-mukherjee/fbset.git","https://github.com/sudipm-mukherjee/fbset.git",5178.7434375,2,3,0,1,1,0,0,2,4,"4",1.6,1.5,1.23597022564938,1.22474487139159,1,0,0 +"fcgiwrap",0.3134577921,1.1712166293,-0.0802338795,"https://salsa.debian.org/debian/fcgiwrap","https://github.com/gnosek/fcgiwrap",2589.7245138889,5,10,0,10,65,0,0,68,1,"1",1.66666666666667,1.95588235294118,-0.544908214894381,1.39852863858456,1,0,0 +"fcitx-libpinyin",1.3904314469,5.5830539288,-0.0318276844,"https://salsa.debian.org/input-method-team/fcitx-libpinyin","https://github.com/fcitx/fcitx-libpinyin",4359.6518287037,2,6,0,6,22,0,0,22,3,"3",1.75,2,0.672551173887074,1.4142135623731,1,0,0 +"pkg-fdm",0.3672168929,2.1938634044,-0.4626394068,"https://github.com/ft/pkg-fdm/","https://github.com/ft/pkg-fdm",5107.6653125,0,3,0,2,1,0,0,3,4,"4",2,1.33333333333333,1.18707853959317,1.15470053837925,1,0,0 +"fizmo-ncursesw",-0.2032604477,2.2028162183,-0.7770451436,"https://github.com/chrender/fizmo-ncursesw","https://github.com/chrender/fizmo-ncursesw",4851.4142708333,0,5,0,2,1,0,0,2,3,"3",2,1.5,1.0108141054829,1.22474487139159,1,1,0 +"flake8-polyfill",-0.2905096989,2.1500667272,-0.8317869422,"https://salsa.debian.org/python-team/packages/flake8-polyfill","https://github.com/PyCQA/flake8-polyfill.git",2673.1830902778,0,6,0,4,5,0,0,7,1,"1",2,1.71428571428571,-0.487500531229342,1.30930734141595,1,0,0 +"flam3",0.7831072925,3.742743382,-0.2650609153,"https://salsa.debian.org/debian/flam3","https://github.com/scottdraves/flam3",1152.1052083333,1,7,0,3,25,0,4,29,1,"1",1.875,1.86206896551724,-1.53378674475948,1.36457647844203,1.13793103448276,0,0 +"flask-jwt-simple",-3.7410042156,-1.191605345,-4.3201217059,"https://salsa.debian.org/python-team/packages/flask-jwt-simple","https://github.com/vimalloc/flask-jwt-simple.git",1518.8651041667,3,4,0,3,21,0,0,22,1,"1",1.57142857142857,1.95454545454545,-1.28150786591885,1.39805059083906,1,1,0 +"flask-ldapconn",-1.0816817059,1.8547595955,-1.9421748383,"https://salsa.debian.org/python-team/packages/flask-ldapconn","https://github.com/rroemhild/flask-ldapconn",3190.6329976852,4,10,0,11,32,0,0,32,2,"2",1.71428571428571,2,-0.131568260607736,1.4142135623731,1,0,0 +"flask-silk",-0.0747361696,1.0191065444,-0.3413292213,"https://salsa.debian.org/python-team/packages/flask-silk","https://github.com/sublee/flask-silk.git",2842.4741087963,0,7,0,3,4,0,0,4,2,"2",2,2,-0.371052280385047,1.4142135623731,1,0,0 +"Junicode-font",0.9749123035,2.3528322079,0.3195301325,"https://salsa.debian.org/fonts-team/fonts-junicode","https://github.com/psb1558/Junicode-font",1677.9374305556,3,4,0,6,15,0,0,19,1,"1",1.57142857142857,1.78947368421053,-1.17208862839624,1.33771210811988,1,1,0 +"font-abyssinica",1.1912418458,4.4703518731,0.0766166908,"https://salsa.debian.org/fonts-team/fonts-sil-abyssinica","https://github.com/silnrsi/font-abyssinica",1729.8640509259,1,8,0,7,2,0,0,7,1,"1",1.88888888888889,1.28571428571429,-1.13637046586586,1.13389341902768,1,1,0 +"font-andika",0.226819753,1.7302356665,-0.1521199628,"https://salsa.debian.org/fonts-team/fonts-sil-andika","https://github.com/silnrsi/font-andika",2361.7046180556,0,9,0,6,6,0,0,11,1,"1",2,1.54545454545455,-0.701753617916068,1.24316312101612,1,1,0 +"foomatic-db",1.5209798812,2.5785791995,0.8766539303,"https://salsa.debian.org/printing-team/foomatic-db","https://github.com/OpenPrinting/foomatic-db.git",5681.1902083333,5,53,0,16,22,0,0,30,4,"4",1.91379310344828,1.73333333333333,1.58158246260044,1.31656117720877,1,0,0 +"formiko-debian",0.1628471672,3.1297243219,-0.6061311313,"https://github.com/ondratu/formiko-debian","https://github.com/ondratu/formiko-debian",1770.974849537,2,2,0,3,3,0,0,3,1,"1",1.5,2,-1.10809205729482,1.4142135623731,1,0,0 +"fortunes-br",0.3826030919,2.4726357351,-0.4239383871,"https://github.com/leitao/fortunes-br.git","https://github.com/leitao/fortunes-br.git",0.0056944444,0,1,0,1,0,0,0,1,1,"1",2,1,-2.32626808467335,1,1,0,0 +"fpgatools",0.2633177336,3.6230241615,-0.6179143711,"https://github.com/Wolfgang-Spraul/fpgatools","https://github.com/Wolfgang-Spraul/fpgatools",1132.0893287037,1,6,0,5,0,0,0,5,1,"1",1.85714285714286,1,-1.54755483589848,1,1,0,0 +"fqterm",-1.4778336115,-0.4100027914,-1.8864383483,"https://salsa.debian.org/chinese-team/fqterm","https://github.com/mytbk/fqterm",3515.765625,5,7,0,7,21,0,1,23,2,"2",1.58333333333333,1.91304347826087,0.0920769514924029,1.38312814961625,1.04347826086957,1,0 +"FreeAlchemist",0.059449695,2.2746437451,-0.4707582387,"https://salsa.debian.org/python-team/packages/freealchemist","https://github.com/dakk/FreeAlchemist",3586.1830324074,0,3,0,1,0,0,0,1,2,"2",2,1,0.140514157395832,1,1,0,0 +"freedv-gui",-0.3213805891,1.1426935949,-0.7378333115,"https://salsa.debian.org/debian-hamradio-team/freedv","https://github.com/drowe67/freedv-gui",3043.6515972222,1,33,0,13,0,0,0,13,2,"2",1.97058823529412,1,-0.232670653046179,1,1,1,0 +"freewheeling",0.5792903992,2.5071657819,-0.2534567966,"https://salsa.debian.org/multimedia-team/freewheeling","https://github.com/free-wheeling/freewheeling",5218.8730671296,1,3,0,3,28,0,2,30,4,"4",1.75,1.93333333333333,1.26357372888476,1.39044357430761,1.06666666666667,1,0 +"frozen-bubble",0.1650357772,0.4601977225,-0.0231433032,"https://salsa.debian.org/perl-team/modules/packages/frozen-bubble","https://github.com/kthakore/frozen-bubble.git",3389.417650463,4,17,0,10,23,0,0,27,2,"2",1.80952380952381,1.85185185185185,0.00516743460657165,1.36082763487954,1,0,0 +"fyba",0.4754986254,2.6289545812,-0.0402028003,"https://salsa.debian.org/debian-gis-team/fyba","https://github.com/kartverket/fyba.git",1185.3266203704,1,10,0,5,17,0,0,17,1,"1",1.90909090909091,2,-1.51093511709398,1.4142135623731,1,0,0 +"g2",-0.2327989276,0.4800818237,-0.5737455032,"https://salsa.debian.org/med-team/g2","https://github.com/danielrmeyer/g2",0,0,1,0,0,3,0,0,3,NA,NA,2,2,-2.32627200164482,1.4142135623731,1,0,0 +"ganeti-os-noop",-0.2281036129,2.1546963922,-0.852366861,"https://salsa.debian.org/ganeti-team/ganeti-os-noop","https://github.com/grnet/ganeti-os-noop",677.1858449074,0,6,0,2,5,1,0,6,1,"1",2,1.83333333333333,-1.86046402301679,1.35400640077266,1,0,0 +"ganglia-modules-linux",0.0664199188,1.2956066726,-0.272928033,"https://salsa.debian.org/debian/ganglia-modules-linux","https://github.com/ganglia/ganglia-modules-linux.git",1617.3040972222,0,6,0,3,4,0,0,4,1,"1",2,2,-1.21379577666272,1.4142135623731,1,0,0 +"sonata",-0.5294268825,1.0612461481,-0.8314567315,"https://salsa.debian.org/science-team/gap-sonata","https://github.com/gap-packages/sonata.git",4006.9744907407,4,7,0,4,8,0,0,60,3,"3",1.63636363636364,1.13333333333333,0.429959100913482,1.06458129484475,1,0,0 +"toric",-0.2451456454,2.4949167647,-0.8186260968,"https://salsa.debian.org/science-team/gap-toric","https://github.com/gap-packages/toric.git",3029.62,4,5,0,5,6,0,0,7,2,"2",1.55555555555556,1.85714285714286,-0.242322405202767,1.36277028773849,1,1,0 +"garmintools",-0.2174342508,0.5366088912,-0.517674515,"https://salsa.debian.org/debian/garmin-forerunner-tools","https://github.com/jorgesca/garmintools.git",2685.7982986111,0,5,0,3,1,0,0,4,1,"1",2,1.25,-0.478823054081972,1.11803398874989,1,0,0 +"gatk-native-bindings",-0.1009865887,2.4624009827,-0.676296384,"https://salsa.debian.org/java-team/gatk-native-bindings","https://github.com/broadinstitute/gatk-native-bindings",505.8018981481,1,4,0,3,6,0,0,6,1,"1",1.8,2,-1.97835191215328,1.4142135623731,1,1,0 +"gau2grid",-0.815898809,1.1342927173,-1.4069047503,"https://salsa.debian.org/debichem-team/gau2grid","https://github.com/dgasmith/gau2grid",1166.9793981482,4,10,0,8,18,0,0,18,1,"1",1.71428571428571,2,-1.5235554082017,1.4142135623731,1,1,0 +"gconjugue",-1.193395361,0.6134141951,-1.7117987645,"https://salsa.debian.org/debian/gconjugue","https://github.com/jalvesaq/gconjugue",2752.1538888889,0,4,0,1,3,0,0,3,2,"2",2,2,-0.433179803251474,1.4142135623731,1,1,0 +"gdnsd",-2.9678392165,-0.3979054994,-3.671905411,"https://github.com/paravoid/gdnsd","https://github.com/paravoid/gdnsd",4241.3566550926,2,11,0,9,3,0,0,11,3,"3",1.84615384615385,1.27272727272727,0.591180843843076,1.12815214963553,1,1,0 +"geki2",-0.2585741806,1.1302096458,-0.6025965378,"https://salsa.debian.org/games-team/geki2","https://github.com/Quipyowert2/geki2",1827.8569328704,0,3,0,1,1,0,0,1,1,"1",2,2,-1.06896523788927,1.4142135623731,1,0,0 +"gelemental",0.1018714919,1.200080654,-0.3080550909,"https://salsa.debian.org/debichem-team/gelemental","https://github.com/ginggs/gelemental",1560.5809722222,8,4,0,9,9,0,0,12,1,"1",1.33333333333333,1.75,-1.25281325524177,1.3228756555323,1,0,0 +"genetic",0.2707726153,2.7069673968,-0.4380759284,"https://salsa.debian.org/science-team/genetic","https://github.com/skoblov-lab/genetic",1118.9616550926,2,4,0,1,1,0,0,1,1,"1",1.66666666666667,2,-1.55658481659707,1.4142135623731,1,1,0 +"genext2fs",-0.2882576546,0.2063423739,-0.5033680475,"https://salsa.debian.org/debian/genext2fs","https://github.com/bestouff/genext2fs",3682.2901041667,0,10,0,5,18,0,0,19,2,"2",2,1.94736842105263,0.206622214976658,1.39548142984872,1,1,0 +"gimp-texturize",0.1555855572,1.2662980132,-0.1945666027,"https://salsa.debian.org/debian/gimp-texturize","https://github.com/lmanul/gimp-texturize.git",3625.7350810185,1,11,0,4,8,0,0,8,2,"2",1.91666666666667,2,0.167720366670117,1.4142135623731,1,1,0 +"ginkgocadx",-0.2628483641,0.2619463655,-0.4738586037,"https://salsa.debian.org/med-team/ginkgocadx","https://github.com/gerddie/ginkgocadx.git",2123.8061111111,1,5,0,5,27,0,0,27,1,"1",1.83333333333333,2,-0.865394106670816,1.4142135623731,1,1,0 +"git-lfs",0.1085080655,1.2887939983,-0.2117786782,"https://salsa.debian.org/go-team/packages/git-lfs","https://github.com/github/git-lfs.git",3479.3090162037,54,197,0,202,5,0,124,330,2,"2",1.78486055776892,1.01515151515152,0.0669999665277226,1.00754727688159,1.37575757575758,1,1 +"debian",-0.5135509471,0.0361166657,-0.7320665039,"https://salsa.debian.org/debian/github-backup","https://salsa.debian.org/debian/github-backup",3299.6675694445,9,13,0,0,0,0,0,2,2,"2",1.59090909090909,1,-0.0565679134301937,1,1,1,0 +"gitless",-1.0129472172,1.1745444276,-1.5532855313,"https://salsa.debian.org/python-team/packages/gitless","https://github.com/sdg-mit/gitless.git",1580.4098032407,8,31,0,24,19,0,0,38,1,"1",1.7948717948718,1.5,-1.23917382706302,1.22474487139159,1,0,0 +"gitmagic",0.0058626792,1.3968023647,-0.4117773836,"https://salsa.debian.org/debian/gitmagic","https://github.com/blynn/gitmagic",4774.4399537037,12,73,0,47,40,0,3,65,3,"3",1.85882352941176,1.61538461538462,0.957866674082711,1.27097781860449,1.04615384615385,0,0 +"giza",-0.0821548044,1.7697955982,-0.4330998724,"https://salsa.debian.org/debian-astro-team/giza","https://github.com/danieljprice/giza",4755.9934837963,2,14,0,9,20,0,1,23,3,"3",1.875,1.8695652173913,0.945178114620037,1.36732045161012,1.04347826086957,1,0 +"gjots2",0.4947222776,2.209205505,-0.3492735275,"https://github.com/leggewie-DM/gjots2","https://github.com/leggewie-DM/gjots2",4231.0400231482,3,4,0,1,2,0,0,2,3,"3",1.57142857142857,2,0.584084461796096,1.4142135623731,1,0,0 +"gkrellm-cpufreq-debian",0.5206628103,3.0983277333,-0.2908114881,"https://github.com/glaubitz/gkrellm-cpufreq-debian","https://github.com/glaubitz/gkrellm-cpufreq-debian",3039.7838657408,1,2,0,1,3,0,0,3,2,"2",1.66666666666667,2,-0.235331104673713,1.4142135623731,1,0,0 +"glimpse",4.8421978907,8.0624327916,3.3845931676,"https://github.com/az143/glimpse","https://github.com/az143/glimpse",3292.5989583333,0,6,0,2,2,0,0,4,2,"2",2,1.5,-0.0614301170308403,1.22474487139159,1,1,0 +"global",0.9251069439,1.8029807522,0.3956705838,"https://github.com/punitagrawal/global","https://github.com/punitagrawal/global",2253.924212963,4,4,0,5,4,0,0,6,1,"1",1.5,1.66666666666667,-0.775891276004239,1.29099444873581,1,0,0 +"gmetric4j",-2.7598692877,-0.5906102463,-3.2950920542,"https://github.com/ganglia/gmetric4j","https://github.com/ganglia/gmetric4j",3040.7001273148,1,11,0,5,21,0,2,23,2,"2",1.91666666666667,1.91304347826087,-0.234700846444175,1.38312814961625,1.08695652173913,0,0 +"gnarwl",-1.0091273178,-0.1197325367,-1.4783256893,"https://salsa.debian.org/debian/gnarwl","https://github.com/fln/gnarwl",2570.5118287037,1,9,0,5,7,0,0,8,1,"1",1.9,1.875,-0.558123821979846,1.36930639376292,1,1,0 +"dash-to-panel",0.1124971506,2.1907441864,-0.4246734255,"https://salsa.debian.org/gnome-team/shell-extensions/gnome-shell-extension-dash-to-panel","https://github.com/home-sweet-gnome/dash-to-panel.git",2629.7539467593,40,85,0,86,104,0,2,187,1,"1",1.68,1.55614973262032,-0.517373632842482,1.24745730693291,1.01069518716578,1,0 +"dash-to-dock",-0.0287596469,0.9830411728,-0.301129726,"https://salsa.debian.org/gnome-team/shell-extensions/gnome-shell-extension-dashtodock","https://github.com/micheleg/dash-to-dock.git",4172.0530092593,157,30,0,142,64,0,0,197,3,"3",1.16042780748663,1.3248730964467,0.543509748205251,1.15103131862113,1,1,0 +"GoldenEye",0.2914223421,3.2376647843,-0.4228022843,"https://salsa.debian.org/pkg-security-team/goldeneye","https://github.com/jseidl/GoldenEye",3012.1110532407,1,7,0,5,0,0,0,5,2,"2",1.875,1,-0.254366081483346,1,1,1,0 +"apps-gorm",0.3792145956,1.5053938025,-0.0975198397,"https://salsa.debian.org/gnustep-team/gorm.app","https://github.com/gnustep/apps-gorm",5785.6866782407,3,22,0,21,13,0,0,27,4,"4",1.88,1.48148148148148,1.65346123825321,1.21716123890037,1,1,0 +"gosa-core",-0.3775685336,-0.2189132452,-0.4901429898,"https://salsa.debian.org/debian-edu-pkg-team/gosa","https://github.com/gosa-project/gosa-core",5676.7658217593,7,31,0,8,18,0,0,20,4,"4",1.81578947368421,1.9,1.57853911108593,1.37840487520902,1,1,0 +"gosa-plugins-mailaddress",-2.3383979882,0.2643568587,-2.9856475557,"https://salsa.debian.org/debian-edu-pkg-team/gosa-plugin-mailaddress","https://github.com/gosa-project/gosa-plugins-mailaddress",2274.6763657408,0,4,0,2,4,0,0,4,1,"1",2,2,-0.761616733188111,1.4142135623731,1,1,0 +"gosa-plugins-netgroups",-0.9914007629,0.4777372444,-1.3827009663,"https://salsa.debian.org/debian-edu-pkg-team/gosa-plugin-netgroups","https://github.com/gosa-project/gosa-plugins-netgroups",1422.7270023148,0,3,0,1,2,0,0,2,1,"1",2,2,-1.34763726780984,1.4142135623731,1,1,0 +"gosa-plugins-pwreset",-1.3598337718,0.2879233373,-1.6292931799,"https://salsa.debian.org/debian-edu-pkg-team/gosa-plugin-pwreset","https://github.com/gosa-project/gosa-plugins-pwreset",2184.168125,0,3,0,1,1,0,0,2,1,"1",2,1.5,-0.823873587766068,1.22474487139159,1,1,0 +"linux-crypto",-2.3611563875,-0.8645584676,-2.6234146821,"https://salsa.debian.org/lumag/gost-crypto","https://github.com/GostCrypt/linux-crypto.git",1726.5372222222,2,3,0,2,3,0,0,3,1,"1",1.6,2,-1.1386588529687,1.4142135623731,1,1,0 +"gpicview",2.0702671645,4.218597649,1.053942169,"https://salsa.debian.org/lxde-team/gpicview","https://github.com/lxde/gpicview",5713.732662037,76,42,0,59,6,0,0,60,4,"4",1.35593220338983,1.1,1.6039670630662,1.04880884817015,1,0,0 +"gpustat",-0.7414031604,1.6738603051,-1.1885003927,"https://salsa.debian.org/nvidia-team/gpustat","https://github.com/wookayin/gpustat",2769.8730787037,16,5,3,17,31,0,0,44,2,"2",1.23809523809524,1.70454545454545,-0.420991509517001,1.30558241966773,1,1,0 +"gpyfft",-0.0412032188,3.0931064376,-0.9221041966,"https://salsa.debian.org/science-team/gpyfft","https://github.com/geggo/gpyfft",2840.7253009259,4,10,0,8,33,0,0,33,2,"2",1.71428571428571,2,-0.372255212586371,1.4142135623731,1,1,0 +"gss-ntlmssp",-1.0758514008,0.7187446283,-1.5147853098,"https://salsa.debian.org/freeipa-team/gss-ntlmssp","https://github.com/gssapi/gss-ntlmssp",3594.9212152778,10,4,0,7,12,0,1,19,2,"2",1.28571428571429,1.63157894736842,0.146524789972329,1.27733274731701,1.05263157894737,1,0 +"gtkguitune",-0.2491277386,0.3826186785,-0.4591495452,"https://github.com/bobek/gtkguitune","https://github.com/bobek/gtkguitune",3186.2603587963,1,3,0,2,1,0,0,2,2,"2",1.75,1.5,-0.134576017041846,1.22474487139159,1,0,0 +"gtkterm",1.6614158143,3.2236786848,0.801083568,"https://salsa.debian.org/debian/gtkterm","https://github.com/Jeija/gtkterm.git",4575.4452083333,6,17,0,14,44,0,0,46,3,"3",1.73913043478261,1.95652173913043,0.820986464911681,1.39875721236047,1,1,0 +"gtranscribe",-0.5259853209,1.6855244705,-0.950618829,"https://salsa.debian.org/debian/gtranscribe","https://github.com/innir/gtranscribe",3558.9036921296,0,5,1,2,14,0,0,14,2,"2",2,2,0.121749833763454,1.4142135623731,1,0,0 +"guake-indicator",0.2250848406,2.5013911283,-0.5378976224,"https://salsa.debian.org/debian/guake-indicator/","https://github.com/Ozzyboshi/guake-indicator",2489.1411226852,1,8,0,4,11,0,0,11,1,"1",1.88888888888889,2,-0.614095346451383,1.4142135623731,1,1,0 +"gufw",1.8217065732,4.3624901931,0.7344598754,"https://salsa.debian.org/python-team/packages/gui-ufw","https://github.com/costales/gufw.git",1462.9175578704,0,7,0,8,66,0,0,67,1,"1",2,1.98507462686567,-1.31999185616386,1.40892676419524,1,1,0 +"guidedog",-1.2127820662,0.0904612737,-1.6926274962,"https://github.com/antocm/guidedog/tree/debian","https://github.com/antocm/guidedog",2480.6617361111,0,5,0,2,1,0,1,4,1,"1",2,1.25,-0.619927963818964,1.11803398874989,1.25,0,0 +"guile-ssh",-0.8980031766,3.1579670718,-2.0800708726,"https://salsa.debian.org/debian/guile-ssh","https://github.com/artyom-poptsov/guile-ssh.git",3867.3559837963,0,10,0,8,28,0,0,28,3,"3",2,2,0.333921336704564,1.4142135623731,1,0,0 +"gup",-5.1695702647,-4.4485454537,-5.4289590562,"https://github.com/rfc1036/gup","https://github.com/rfc1036/gup",3593.8147453704,0,1,0,1,0,0,0,1,2,"2",2,1,0.145763695340989,1,1,0,0 +"guzzle_sphinx_theme",-0.8704022633,0.681504729,-1.1374775257,"https://salsa.debian.org/python-team/packages/guzzle-sphinx-theme","https://github.com/guzzle/guzzle_sphinx_theme.git",2860.3134027778,3,11,0,12,42,0,0,42,2,"2",1.78571428571429,2,-0.35878137198942,1.4142135623731,1,0,0 +"debian-gwaei",-0.2415301818,1.2081497422,-0.8722234296,"https://github.com/norbusan/debian-gwaei","https://github.com/norbusan/debian-gwaei",2765.6634375,2,2,0,2,3,0,0,3,2,"2",1.5,2,-0.423887146622518,1.4142135623731,1,0,0 +"gwakeonlan",0.8535169941,3.0627414632,-0.0322068923,"https://salsa.debian.org/debian/gwakeonlan","https://github.com/muflone/gwakeonlan.git",4933.5151273148,2,13,0,10,35,0,0,35,3,"3",1.86666666666667,2,1.06728787009106,1.4142135623731,1,0,0 +"gwc",0.608752043,1.6289733041,0.0519069422,"https://salsa.debian.org/multimedia-team/gwc","https://github.com/AlisterH/gwc.git",3165.1705324074,1,5,0,3,6,0,0,7,2,"2",1.83333333333333,1.85714285714286,-0.149082831491243,1.36277028773849,1,0,0 +"gxkb",0.3787936181,4.0698464881,-0.6334875708,"https://github.com/mati75/gxkb.git","https://github.com/mati75/gxkb.git",2732.567650463,0,4,0,2,2,0,0,3,1,"1",2,1.66666666666667,-0.446652362075178,1.29099444873581,1,0,0 +"gxtuner",1.2625236588,4.7533829415,0.0339744566,"https://salsa.debian.org/multimedia-team/gxtuner","https://github.com/brummer10/gxtuner",1914.1892013889,3,6,0,4,9,0,0,9,1,"1",1.66666666666667,2,-1.00958086092482,1.4142135623731,1,1,0 +"h2o",-0.7321540349,0.815719718,-1.2812732312,"https://salsa.debian.org/debian/h2o","https://github.com/h2o/h2o",4716.5859490741,44,155,4,123,17,0,22,154,3,"3",1.77889447236181,1.11038961038961,0.91807131043961,1.05375025997131,1.14285714285714,1,0 +"h5utils",-0.0466394355,0.6200500479,-0.3159473526,"https://salsa.debian.org/debian-gis-team/h5utils","https://github.com/NanoComp/h5utils.git",5379.8304166667,0,6,0,3,18,0,0,18,4,"4",2,2,1.37428959543312,1.4142135623731,1,1,0 +"hacktv",-2.0082673058,0.152267044,-2.4727541201,"https://salsa.debian.org/debian-hamradio-team/hacktv","https://github.com/fsphil/hacktv",2394.7430787037,3,7,0,8,43,0,0,45,1,"1",1.7,1.95555555555556,-0.679027834902134,1.3984117975602,1,0,0 +"HandBrake",1.3904843391,2.685148707,0.6451582617,"https://salsa.debian.org/multimedia-team/handbrake","https://github.com/HandBrake/HandBrake",5786.3675231482,105,51,3,108,0,0,2,110,4,"4",1.32692307692308,1,1.65392956314882,1,1.01818181818182,0,1 +"hexedit",1.4888142147,3.4858685969,0.5617313768,"https://salsa.debian.org/debian/hexedit","https://github.com/pixel/hexedit.git",5414.7907060185,8,14,0,14,45,0,0,45,4,"4",1.63636363636364,2,1.39833732448368,1.4142135623731,1,1,0 +"hexter",0.4080603481,2.7603000142,-0.3443231764,"https://salsa.debian.org/multimedia-team/hexter","https://github.com/smbolton/hexter.git",4380.3528472222,0,6,0,5,17,0,0,17,3,"3",2,2,0.686790543572898,1.4142135623731,1,0,0 +"hfst-ospell",0.2591920737,1.3643095914,-0.0408851515,"https://salsa.debian.org/science-team/hfst-ospell","https://github.com/hfst/hfst-ospell.git",4745.7576967593,1,17,0,8,24,0,1,26,3,"3",1.94444444444444,1.92307692307692,0.938137342422526,1.38675049056307,1.03846153846154,1,0 +"hijra",-1.1521044725,0.9019784859,-1.9896405953,"https://salsa.debian.org/islamic-team/hijra","https://github.com/ojuba-org/hijra.git",4311.2884143519,0,8,0,4,4,0,0,6,3,"3",2,1.66666666666667,0.63928399258348,1.29099444873581,1,0,0 +"hinawa-utils",-1.8036430906,0.9409258571,-2.4422801802,"https://salsa.debian.org/debian/hinawa-utils/","https://github.com/takaswie/hinawa-utils.git",2264.2987962963,1,2,0,2,8,0,0,8,1,"1",1.66666666666667,2,-0.768755031607026,1.4142135623731,1,0,0 +"hiro",-3.1230113579,-1.1402355338,-3.6931446576,"https://salsa.debian.org/python-team/packages/hiro","https://github.com/alisaifee/hiro",3329.7532638889,1,3,0,3,6,0,0,6,2,"2",1.75,2,-0.0358732154825676,1.4142135623731,1,0,0 +"hmat-oss",0.3027957485,3.0822404955,-0.6301530543,"https://salsa.debian.org/science-team/hmat-oss","https://github.com/jeromerobert/hmat-oss.git",3261.6730555556,6,19,0,14,7,0,0,16,2,"2",1.76,1.4375,-0.0827027593467722,1.19895788082818,1,1,0 +"hodie",-0.8398270988,0.8472590081,-1.2059612682,"https://salsa.debian.org/cts/hodie","https://github.com/michiexile/hodie",1318.6005671296,0,5,0,1,2,0,0,2,1,"1",2,2,-1.41926151196691,1.4142135623731,1,0,0 +"hoel",-2.626226217,-0.6734593354,-3.0112543725,"https://salsa.debian.org/debian-iot-team/oauth2/hoel.git","https://github.com/babelouest/hoel",1340.3941203704,3,9,0,7,12,0,0,12,1,"1",1.75,2,-1.40427063308401,1.4142135623731,1,0,0 +"html2text",1.3340380398,2.3215255445,0.7275451633,"https://salsa.debian.org/debian/html2text","https://github.com/grobian/html2text",1388.0924421296,5,7,0,7,21,0,0,23,1,"1",1.58333333333333,1.91304347826087,-1.37146094131374,1.38312814961625,1,1,0 +"html5-parser",0.4588005785,2.4674305887,-0.084728594,"https://github.com/debian-calibre/html5-parser","https://github.com/debian-calibre/html5-parser",2309.5259259259,1,6,0,5,4,0,0,6,1,"1",1.85714285714286,1.66666666666667,-0.737645170126102,1.29099444873581,1,0,0 +"hyphen",0.4314729534,1.6039540493,0.0503177929,"https://salsa.debian.org/libreoffice-team/hyphen","https://github.com/hunspell/hyphen.git",2824.9621875,2,9,0,6,18,0,0,19,2,"2",1.81818181818182,1.94736842105263,-0.383098002725918,1.39548142984872,1,1,0 +"i18nspector",-0.3130156228,1.3470282705,-0.8210059464,"https://salsa.debian.org/debian/i18nspector","https://github.com/jwilk/i18nspector",3956.4540162037,0,2,0,2,6,0,0,7,3,"3",2,1.85714285714286,0.395208167620382,1.36277028773849,1,0,0 +"i2pd",-0.8587827802,0.1492942795,-1.1545577005,"https://salsa.debian.org/yangfl-guest/i2pd","https://github.com/PurpleI2P/i2pd",3747.1315856482,37,139,2,97,14,0,23,126,2,"2",1.78977272727273,1.11111111111111,0.251223973337798,1.05409255338946,1.18253968253968,1,0 +"i7z",0.0808738409,1.2622361789,-0.2430911659,"https://salsa.debian.org/debian/i7z","https://github.com/ajaiantilal/i7z",310.0352199074,0,7,0,3,33,0,0,35,1,"1",2,1.94285714285714,-2.11301166820074,1.39386410487434,1,1,0 +"IanniX",-0.1880732304,2.1486905541,-0.8754662474,"https://salsa.debian.org/multimedia-team/iannix","https://github.com/buzzinglight/IanniX",4212.6902430556,7,14,0,10,41,0,3,45,3,"3",1.66666666666667,1.91111111111111,0.571462411235704,1.38242942355518,1.06666666666667,0,0 +"ibuffer-projectile",-0.7228061953,1.8154077231,-1.292148074,"https://salsa.debian.org/emacsen-team/ibuffer-projectile","https://github.com/purcell/ibuffer-projectile.git",3152.3891087963,1,7,0,7,14,0,0,14,2,"2",1.875,2,-0.157874641215336,1.4142135623731,1,1,0 +"ice-builder-gradle-debian-packaging",-1.1849485707,0.9406079932,-1.6391429375,"https://github.com/zeroc-ice/ice-builder-gradle-debian-packaging.git","https://github.com/zeroc-ice/ice-builder-gradle-debian-packaging.git",2370.9240625,0,3,0,2,3,0,0,4,1,"1",2,1.75,-0.695411945518432,1.3228756555323,1,1,1 +"icebreaker",0.4692256371,1.8411957204,-0.176942106,"https://salsa.debian.org/games-team/icebreaker","https://github.com/mattdm/icebreaker.git",3923.7699305556,0,5,0,4,7,0,0,7,3,"3",2,2,0.372726144430531,1.4142135623731,1,0,0 +"icemon",0.7030922937,3.5835100346,-0.2959059985,"https://salsa.debian.org/qt-kde-team/extras/icemon","https://github.com/icecc/icemon.git",4527.72,9,27,0,37,45,0,1,68,3,"3",1.75,1.66176470588235,0.788158278985297,1.28909452945948,1.01470588235294,1,0 +"icecream-sundae",-1.0385376489,1.8149325043,-1.7149505904,"https://salsa.debian.org/debian/icecream-sundae","https://github.com/JPEWdev/icecream-sundae",638.2833796296,3,6,0,6,16,0,0,16,1,"1",1.66666666666667,2,-1.8872234109322,1.4142135623731,1,1,0 +"ifetch-tools",-1.7763116684,-1.4179435016,-1.8644650677,"https://github.com/unixabg/ifetch-tools","https://github.com/unixabg/ifetch-tools",5167.9663194445,0,4,0,3,2,0,0,3,4,"4",2,1.66666666666667,1.22855709435814,1.29099444873581,1,0,0 +"ifupdown-multi",-0.0008911093,3.5795714925,-1.035637135,"https://github.com/edmonds/ifupdown-multi","https://github.com/edmonds/ifupdown-multi",2598.1821759259,0,2,0,1,1,0,0,2,1,"1",2,1.5,-0.53909054093235,1.22474487139159,1,1,0 +"inn",-0.504610683,-0.419983647,-0.5703395284,"https://salsa.debian.org/md/inn2","https://github.com/InterNetNews/inn.git",5725.5850115741,6,6,0,10,0,0,0,10,4,"4",1.5,1,1.61211980137487,1,1,0,0 +"iodine",-0.2722510221,-0.1412187428,-0.330852502,"https://git.toastfreeware.priv.at/debian/iodine.git/","https://github.com/yarrick/iodine.git",5593.1268634259,29,23,0,31,45,0,0,60,4,"4",1.44230769230769,1.75,1.52100735018333,1.3228756555323,1,1,0 +"ionit",-2.5676980502,-0.9981519368,-2.9844493768,"https://github.com/bdrung/ionit/tree/debian/unstable","https://github.com/bdrung/ionit",1307.9435069445,2,5,0,2,4,0,0,4,1,"1",1.71428571428571,2,-1.4265920604423,1.4142135623731,1,1,0 +"ip4r",-1.4632745556,-0.4677957849,-1.7119933385,"https://salsa.debian.org/postgresql/ip4r","https://github.com/RhodiumToad/ip4r.git",3711.2765972222,1,6,0,5,22,0,0,23,2,"2",1.85714285714286,1.95652173913043,0.226560818004522,1.39875721236047,1,0,0 +"ipheth-debian",0.9430908027,3.7638258527,-0.137434873,"https://github.com/pmcenery/ipheth-debian","https://github.com/pmcenery/ipheth-debian",4243.6053819445,0,4,0,2,1,0,0,2,3,"3",2,1.5,0.592727649520199,1.22474487139159,1,0,0 +"ipmctl",-1.8038062885,-0.2344447385,-2.0696396657,"https://github.com/kilobyte/ipmctl/tree/debian","https://github.com/kilobyte/ipmctl",1854.5950810185,32,11,0,22,0,0,0,22,1,"1",1.25581395348837,1,-1.0505731778148,1,1,1,0 +"ippusbxd",0.0111748533,2.660027865,-0.7220268879,"https://salsa.debian.org/printing-team/ippusbxd","https://github.com/OpenPrinting/ippusbxd",2327.0776967593,1,12,0,6,11,0,0,13,1,"1",1.92307692307692,1.84615384615385,-0.725572036945998,1.35873244097351,1,0,0 +"iprange",0.6480375888,3.9597495364,-0.2945161283,"https://salsa.debian.org/debian/iprange","https://github.com/firehol/iprange.git",1873.7119328704,0,7,0,3,20,0,1,21,1,"1",2,1.95238095238095,-1.03742349049361,1.39727626201154,1.04761904761905,1,0 +"iprutils",-1.9030231406,0.3339685092,-2.4460433686,"https://salsa.debian.org/debian/iprutils","https://github.com/bjking1/iprutils",5119.0450578704,18,20,0,15,14,0,0,22,4,"4",1.52631578947368,1.63636363636364,1.19490619315113,1.27920429813366,1,0,0 +"ipv6calc",0.5432988576,1.7634814459,-0.0022190697,"https://salsa.debian.org/debian/ipv6calc","https://github.com/pbiering/ipv6calc",5498.6132407407,2,10,5,7,16,0,0,19,4,"4",1.83333333333333,1.84210526315789,1.45599535994921,1.35724178507659,1,0,0 +"ipv6toolkit",0.1556183786,2.6785840103,-0.5536700112,"https://github.com/alvarezp/ipv6toolkit/tree/debian","https://github.com/alvarezp/ipv6toolkit",3020.5637962963,1,17,0,8,0,0,0,8,2,"2",1.94444444444444,1,-0.24855179108404,1,1,0,0 +"pkg-ipvsadm",1.6190855359,2.7831585401,0.9056298919,"https://github.com/formorer/pkg-ipvsadm","https://github.com/formorer/pkg-ipvsadm",3173.692650463,1,2,0,2,3,0,0,4,2,"2",1.66666666666667,1.75,-0.143220820914735,1.3228756555323,1,0,0 +"ipython_genutils",0.5301773312,3.2373221637,-0.0754853283,"https://salsa.debian.org/python-team/packages/ipython-genutils","https://github.com/ipython/ipython_genutils",4920.5252546296,2,28,3,27,23,0,0,43,3,"3",1.93333333333333,1.53488372093023,1.05835267691826,1.23890424203416,1,1,1 +"ir.lv2",0.0482033805,1.8072786295,-0.420434878,"https://salsa.debian.org/multimedia-team/ir.lv2","https://github.com/tomszilagyi/ir.lv2.git",901.6371759259,2,4,0,0,1,0,0,1,1,"1",1.66666666666667,2,-1.70607328731499,1.4142135623731,1,0,0 +"sptable",-0.3572895376,2.8910468841,-1.1439831667,"https://salsa.debian.org/debian-astro-team/iraf-sptable","https://github.com/iraf-community/sptable",2001.9924189815,2,4,0,1,3,0,0,3,1,"1",1.66666666666667,2,-0.949184679268896,1.4142135623731,1,0,0 +"ircmarkers",-1.4435928142,0.7583118463,-1.9125989528,"https://github.com/df7cb/ircmarkers","https://github.com/df7cb/ircmarkers",5694.8846527778,1,3,0,3,1,0,0,3,4,"4",1.75,1.33333333333333,1.59100230138339,1.15470053837925,1,0,0 +"jack_midi_clock",0.3118920052,2.9552674463,-0.4056573573,"https://salsa.debian.org/multimedia-team/jack-midi-clock","https://github.com/x42/jack_midi_clock",4775.6370949074,0,4,0,3,3,0,0,4,3,"3",2,1.75,0.958690137727767,1.3228756555323,1,1,0 +"jackson-dataformat-yaml",-0.30501226,2.808298895,-1.2455361494,"https://salsa.debian.org/java-team/jackson-dataformat-yaml","https://github.com/FasterXML/jackson-dataformat-yaml.git",2094.1709722222,1,22,0,16,0,0,4,20,1,"1",1.95652173913043,1,-0.885778886190369,1,1.2,1,0 +"jaraco.itertools",-2.1770715585,0.4444182514,-2.9053425973,"https://salsa.debian.org/python-team/packages/jaraco.itertools","https://github.com/jaraco/jaraco.itertools.git",3229.3396990741,17,5,0,18,7,0,0,21,2,"2",1.22727272727273,1.33333333333333,-0.104943530529706,1.15470053837925,1,0,0 +"java-atk-wrapper",0.561521277,1.2449834534,0.2042642146,"https://salsa.debian.org/a11y-team/java-atk-wrapper","https://github.com/GNOME/java-atk-wrapper",5298.5764814815,11,11,0,8,3,0,0,11,4,"4",1.5,1.27272727272727,1.31839839276132,1.12815214963553,1,0,0 +"JDim",-1.0625455629,0.9599464829,-1.4721593744,"https://salsa.debian.org/debian/jdim","https://github.com/JDimproved/JDim.git",5782.9914467593,2,15,0,8,9,0,0,9,4,"4",1.88235294117647,2,1.65160730061153,1.4142135623731,1,1,1 +"jhead",-0.1046962169,0.0128556712,-0.1619952781,"https://salsa.debian.org/reichel/jhead","https://github.com/Matthias-Wandel/jhead",974.1013078704,4,13,0,10,49,0,0,49,1,"1",1.76470588235294,2,-1.65622822472554,1.4142135623731,1,0,0 +"jinja2-time",-0.4698555936,1.1570025567,-0.7656248707,"https://salsa.debian.org/python-team/packages/jinja2-time","https://github.com/hackebrot/jinja2-time",2112.1138657407,0,3,0,2,20,0,0,20,1,"1",2,2,-0.873436715981933,1.4142135623731,1,0,0 +"jitterdebugger",-2.3485028902,-0.1533055837,-2.7859741296,"https://salsa.debian.org/debian/jitterdebugger","https://github.com/igaw/jitterdebugger.git",1214.2022916667,8,3,0,9,12,0,0,13,1,"1",1.27272727272727,1.92307692307692,-1.4910727437452,1.38675049056307,1,0,0 +"jitterentropy-rngd",-1.0568983374,-0.2694182082,-1.1867836067,"https://salsa.debian.org/debian/jitterentropy-rngd","https://github.com/smuellerDD/jitterentropy-rngd",2267.9794675926,9,1,0,10,33,0,0,33,1,"1",1.1,2,-0.76622325090101,1.4142135623731,1,1,0 +"jmxetric",-2.9017326958,-0.7363274677,-3.3243552835,"https://github.com/ganglia/jmxetric","https://github.com/ganglia/jmxetric",2292.7484027778,0,9,0,5,14,0,0,16,1,"1",2,1.875,-0.749185730524363,1.36930639376292,1,0,0 +"jp2a",0.9044983067,3.5392448615,-0.0351520282,"https://salsa.debian.org/debian/jp2a","https://github.com/Talinx/jp2a",2190.7298032407,3,4,0,6,11,0,0,13,1,"1",1.57142857142857,1.84615384615385,-0.819360082203756,1.35873244097351,1,1,0 +"jupyter-sphinx-theme",-0.4091049447,-0.045316663,-0.4899605303,"https://salsa.debian.org/python-team/packages/jupyter-sphinx-theme","https://github.com/jupyter/jupyter-sphinx-theme",1834.3539467593,2,32,0,24,12,0,0,30,1,"1",1.94117647058824,1.4,-1.06449621224518,1.18321595661992,1,1,0 +"kamcli",-4.7786388825,-2.4182541708,-5.4179403291,"https://salsa.debian.org/pkg-voip-team/kamcli/","https://github.com/kamailio/kamcli",3121.9156134259,1,5,0,5,8,0,0,8,2,"2",1.83333333333333,2,-0.17883609129136,1.4142135623731,1,1,0 +"debian-karlyriceditor",-0.1145592946,2.7444681458,-1.0688808595,"https://github.com/martin-steghoefer/debian-karlyriceditor","https://github.com/martin-steghoefer/debian-karlyriceditor",1746.0329513889,1,1,0,2,0,0,0,2,1,"1",1.5,1,-1.12524855170013,1,1,0,0 +"kbtin",-0.2885497121,1.2472045448,-0.639846297,"https://github.com/kilobyte/kbtin/tree/debian","https://github.com/kilobyte/kbtin",5761.0344212963,1,4,0,3,7,0,0,7,4,"4",1.8,2,1.63650397598578,1.4142135623731,1,1,0 +"kcemu-debian",-1.5465318214,-0.3965547601,-1.8452569055,"https://github.com/glaubitz/kcemu-debian","https://github.com/glaubitz/kcemu-debian",4222.8273842593,2,2,0,1,0,0,0,1,3,"3",1.5,1,0.578435329067157,1,1,0,0 +"kchmviewer",0.9382066218,2.3758050403,0.2613367395,"https://salsa.debian.org/qt-kde-team/extras/kchmviewer","https://github.com/gyunaev/kchmviewer",2255.6306481482,1,6,0,4,23,0,0,23,1,"1",1.85714285714286,2,-0.774717490210789,1.4142135623731,1,0,0 +"kcmsystemd-debian",0.7599629002,3.9388494787,-0.1577270679,"https://github.com/shsorbom/kcmsystemd-debian.git","https://github.com/shsorbom/kcmsystemd-debian.git",684.1522685185,1,12,0,8,3,0,0,9,1,"1",1.92307692307692,1.33333333333333,-1.8556721099475,1.15470053837925,1,1,0 +"keychain",1.0933393106,2.2752386059,0.4360362266,"https://salsa.debian.org/debian/keychain","https://github.com/funtoo/keychain",3125.5103356482,23,18,0,32,53,0,0,63,2,"2",1.4390243902439,1.84126984126984,-0.176363431378736,1.35693398559762,1,0,0 +"khard",0.0842088929,2.5350536215,-0.5777839137,"https://salsa.debian.org/python-team/packages/khard","https://github.com/lucc/khard",3364.3432523148,16,20,1,32,41,0,0,63,2,"2",1.55555555555556,1.65079365079365,-0.0120802010381524,1.28483214887924,1,1,0 +"kim-api",-0.8423857472,1.4393693103,-1.2913134011,"https://salsa.debian.org/science-team/kim-api","https://github.com/openkim/kim-api",4210.4546527778,1,26,1,10,24,0,1,26,3,"3",1.96296296296296,1.92307692307692,0.569924641661556,1.38675049056307,1.03846153846154,1,0 +"kindleclip",-0.8974283368,0.9569429807,-1.3449393666,"https://github.com/gwolf/kindleclip","https://github.com/gwolf/kindleclip",1841.0025925926,0,1,0,1,7,0,0,7,1,"1",2,2,-1.05992288529289,1.4142135623731,1,0,0 +"javadev",-0.406165741,0.7632042123,-0.7000750742,"https://salsa.debian.org/med-team/king","https://github.com/rlabduke/javadev.git",5017.5933217593,0,15,0,1,3,0,0,4,4,"4",2,1.75,1.1251217632467,1.3228756555323,1,0,0 +"kismet-debian",1.9335416891,2.9570779251,1.2756598324,"https://github.com/andrikos/kismet-debian","https://github.com/andrikos/kismet-debian",1415.5860300926,0,1,0,1,0,0,0,1,1,"1",2,1,-1.35254924560925,1,1,0,0 +"clj-kitchensink",-0.6039126858,2.5849138336,-1.5600356447,"https://salsa.debian.org/clojure-team/kitchensink-clojure","https://github.com/puppetlabs/clj-kitchensink.git",3697.8495138889,12,47,0,34,0,0,0,34,2,"2",1.79661016949153,1,0.217324885810444,1,1,1,1 +"klatexformula_debian",-0.2602166071,0.57054691,-0.5330870672,"https://github.com/TobiasWinchen/klatexformula_debian","https://github.com/TobiasWinchen/klatexformula_debian",3554.8463541667,0,6,0,3,1,0,0,3,2,"2",2,1.33333333333333,0.118958959723008,1.15470053837925,1,0,0 +"debian-ksmtuned",0.6468606724,3.7904647882,-0.3169526232,"https://github.com/bzed/debian-ksmtuned","https://github.com/bzed/debian-ksmtuned",2027.7201157408,1,1,0,2,2,0,0,3,1,"1",1.5,1.66666666666667,-0.931487666680213,1.29099444873581,1,1,0 +"kylin-burner",0.5891863927,3.7002638946,-0.3231693637,"https://github.com/ukui/kylin-burner","https://github.com/ukui/kylin-burner",1294.0143055556,2,9,0,4,7,0,0,8,1,"1",1.81818181818182,1.875,-1.43617337876379,1.36930639376292,1,0,0 +"kylin-display-switch",-1.7366978486,1.7252586454,-2.558884793,"https://github.com/ukui/kylin-display-switch","https://github.com/ukui/kylin-display-switch",1387.1396296296,4,11,0,10,8,0,0,12,1,"1",1.73333333333333,1.66666666666667,-1.37211634140513,1.29099444873581,1,0,0 +"lablgtk-extras",-0.8756228195,2.0634481167,-1.8186386711,"https://salsa.debian.org/ocaml-team/lablgtk-extras","https://github.com/zoggy/lablgtk-extras.git",3792.5139930556,0,3,0,1,2,0,0,2,3,"3",2,2,0.282440643944085,1.4142135623731,1,0,0 +"labltk",-0.1496995002,2.0785630827,-0.594072233,"https://salsa.debian.org/ocaml-team/labltk","https://github.com/garrigue/labltk.git",3339.1637268519,1,3,0,3,27,0,0,28,2,"2",1.75,1.96428571428571,-0.0294001493904253,1.40152977645347,1,1,0 +"laby",1.665594867,5.3198865227,0.3634891036,"https://salsa.debian.org/ocaml-team/laby","https://github.com/sgimenez/laby.git",2556.9824884259,11,12,0,15,44,0,7,56,1,"1",1.52173913043478,1.78571428571429,-0.567430092473191,1.33630620956212,1.125,0,0 +"coffee",-0.8084062082,0.1539618161,-0.9674228878,"https://salsa.debian.org/debian/latex-coffee-stains","https://github.com/Echsecutor/coffee",1954.8484027778,1,7,0,3,2,0,0,3,1,"1",1.875,1.66666666666667,-0.981613087301045,1.29099444873581,1,0,0 +"latexmk",2.3142169158,4.8870249679,1.1895147626,"https://github.com/debian-tex/latexmk","https://github.com/debian-tex/latexmk",1865.2669907407,3,7,0,5,3,0,0,5,1,"1",1.7,1.6,-1.04323241496043,1.26491106406735,1,0,0 +"latexml",0.5426184631,2.9655400064,-0.3271877484,"https://github.com/debian-tex/latexml","https://github.com/debian-tex/latexml",2055.9208333333,2,6,0,4,1,0,0,4,1,"1",1.75,1.25,-0.912089565913032,1.11803398874989,1,0,0 +"pkg-lava-tool",-1.5553171291,-0.4092627761,-1.882507141,"https://github.com/Linaro/pkg-lava-tool","https://github.com/Linaro/pkg-lava-tool",2892.9631481482,0,21,0,7,2,0,0,7,2,"2",2,1.28571428571429,-0.336322970048391,1.13389341902768,1,0,0 +"pkg-lavapdu",-1.360190138,0.6576027042,-1.9660643803,"https://github.com/Linaro/pkg-lavapdu","https://github.com/Linaro/pkg-lavapdu",1898.0415972222,9,22,0,16,6,0,0,19,1,"1",1.70967741935484,1.31578947368421,-1.02068812625403,1.14707866935281,1,1,0 +"lazyarray",-1.6930876257,1.5097154973,-2.5262604044,"https://salsa.debian.org/science-team/lazyarray","https://github.com/NeuralEnsemble/lazyarray",3518.1808333333,0,8,0,4,5,0,0,6,2,"2",2,1.83333333333333,0.0937382728566348,1.35400640077266,1,0,0 +"lbzip2",0.4553413125,1.9206872689,-0.0826154573,"https://github.com/kjn/lbzip2/tree/debian","https://github.com/kjn/lbzip2",2710.187037037,0,3,0,1,4,0,1,5,1,"1",2,1.8,-0.462047055243707,1.34164078649987,1.2,0,0 +"lcdf-typetools",0.5850757713,1.6610997166,0.0976153045,"https://salsa.debian.org/fonts-team/lcdf-typetools","https://github.com/kohler/lcdf-typetools.git",5649.3697337963,4,5,0,6,27,0,0,28,4,"4",1.55555555555556,1.96428571428571,1.55969448157643,1.40152977645347,1,1,0 +"acme-poe-knee",-1.8444968736,-0.7377441759,-2.0661466284,"https://salsa.debian.org/perl-team/modules/packages/libacme-poe-knee-perl","https://github.com/jib/acme-poe-knee.git",0,0,1,0,1,0,0,0,1,NA,NA,2,1,-2.32627200164482,1,1,0,0 +"Alien-SDL",-0.0977796476,0.3529808751,-0.1969931002,"https://salsa.debian.org/perl-team/modules/packages/libalien-sdl-perl","https://github.com/PerlGameDev/Alien-SDL.git",2024.7772222222,0,15,0,7,10,0,0,12,1,"1",2,1.83333333333333,-0.933511960737045,1.35400640077266,1,1,0 +"ambix",-0.2891761381,1.5956439603,-0.6870161119,"https://salsa.debian.org/multimedia-team/libambix","https://github.com/iem-projects/ambix.git",2332.8963194445,2,15,0,3,2,0,0,4,1,"1",1.88235294117647,1.5,-0.721569648396717,1.22474487139159,1,1,1 +"apache-singleton",-1.4918758035,1.0630563092,-2.2427825215,"https://salsa.debian.org/perl-team/modules/packages/libapache-singleton-perl","https://github.com/mschout/apache-singleton.git",2808.9702777778,2,1,0,2,0,0,0,2,2,"2",1.33333333333333,1,-0.394098172322077,1,1,0,0 +"mod_authnz_pam",-0.1714935794,2.2098425672,-0.8074827861,"https://salsa.debian.org/freeipa-team/mod-authnz-pam","https://github.com/adelton/mod_authnz_pam.git",3451.9741203704,6,1,0,5,17,0,0,18,2,"2",1.14285714285714,1.94444444444444,0.0481974285392649,1.39443337755679,1,0,0 +"App-CPANTS-Lint",-0.2108873196,3.0022710317,-1.1931665391,"https://salsa.debian.org/perl-team/modules/packages/libapp-cpants-lint-perl","https://github.com/charsbar/App-CPANTS-Lint.git",177.5091782407,0,3,0,3,4,0,0,4,1,"1",2,2,-2.20417082051997,1.4142135623731,1,0,0 +"p5-app-perlrdf-command-query",-2.5195716821,-0.1728085325,-3.0060090978,"https://salsa.debian.org/perl-team/modules/packages/libapp-perlrdf-command-query-perl","https://github.com/tobyink/p5-app-perlrdf-command-query",786.4794675926,0,1,0,1,1,0,0,2,1,"1",2,1.5,-1.78528548548122,1.22474487139159,1,0,0 +"Archive-Ar",-0.7153173845,1.4218992511,-1.4262008359,"https://salsa.debian.org/perl-team/modules/packages/libarchive-ar-perl","https://github.com/jbazik/Archive-Ar.git",1734.3291435185,1,5,0,2,4,0,0,4,1,"1",1.83333333333333,2,-1.13329911437412,1.4142135623731,1,0,0 +"libaria",-0.4287076752,2.5333867692,-1.5521033494,"https://github.com/jksrecko/libaria","https://github.com/jksrecko/libaria",1255.0196875,1,2,0,2,3,0,0,4,1,"1",1.66666666666667,1.75,-1.46299615474242,1.3228756555323,1,0,0 +"perl-Array-Iterator",-1.1520508851,1.0062186595,-1.5899210944,"https://salsa.debian.org/perl-team/modules/packages/libarray-iterator-perl","https://github.com/perlancar/perl-Array-Iterator.git",4456.1288194445,1,16,0,6,7,0,0,8,3,"3",1.94117647058824,1.875,0.738913683350384,1.36930639376292,1,0,0 +"Astro-FITS-CFITSIO",-0.284600426,1.0728247575,-0.745324073,"https://salsa.debian.org/perl-team/modules/packages/libastro-fits-cfitsio-perl","https://github.com/pratzlaff/Astro-FITS-CFITSIO",41.8160185185,1,3,0,2,1,0,0,2,1,"1",1.75,1.5,-2.29750850162949,1.22474487139159,1,0,0 +"AtomBus",-2.9184975503,-0.9823925311,-3.3182517592,"https://salsa.debian.org/perl-team/modules/packages/libatombus-perl","https://github.com/ironcamel/AtomBus.git",574.4602777778,0,2,0,2,4,0,0,4,1,"1",2,2,-1.93112466830036,1.4142135623731,1,0,0 +"p5-atteanx-compatibility-trine",-5.221355937,-3.8031880755,-5.4863317126,"https://salsa.debian.org/perl-team/modules/packages/libatteanx-compatibility-trine-perl","https://github.com/kjetilk/p5-atteanx-compatibility-trine.git",174.8482291667,0,1,0,2,4,0,0,4,1,"1",2,2,-2.2060011767194,1.4142135623731,1,0,0 +"atteanx-endpoint",-5.0524581401,-2.9636769875,-5.4798110024,"https://salsa.debian.org/perl-team/modules/packages/libatteanx-endpoint-perl","https://github.com/kasei/atteanx-endpoint.git",581.8788078704,0,3,0,2,1,0,0,2,1,"1",2,1.5,-1.9260217699855,1.22474487139159,1,1,0 +"p5-atteanx-store-sparql",-3.6547632503,-1.1140927923,-4.301232368,"https://salsa.debian.org/perl-team/modules/packages/libatteanx-store-sparql-perl","https://github.com/kjetilk/p5-atteanx-store-sparql.git",1578.1186458333,1,3,0,4,5,0,0,5,1,"1",1.75,2,-1.24074981895459,1.4142135623731,1,0,0 +"perl-Authen-Captcha",-0.8189234623,0.262039817,-1.0902527604,"https://salsa.debian.org/perl-team/modules/packages/libauthen-captcha-perl","https://github.com/lkundrak/perl-Authen-Captcha.git",604.0063194444,4,2,0,4,1,0,0,5,1,"1",1.33333333333333,1.2,-1.91080117505449,1.09544511501033,1,0,0 +"B-Hooks-OP-Check",0.6263225059,3.4250343136,-0.0183739613,"https://salsa.debian.org/perl-team/modules/packages/libb-hooks-op-check-perl","https://github.com/karenetheridge/B-Hooks-OP-Check",4225.8527430556,1,3,0,3,0,0,0,3,3,"3",1.75,1,0.580516347558797,1,1,0,0 +"B-Hooks-Parser",-1.1725055097,-0.0976957027,-1.3418704161,"https://salsa.debian.org/perl-team/modules/packages/libb-hooks-parser-perl","https://github.com/karenetheridge/B-Hooks-Parser.git",3844.972962963,4,3,0,6,6,0,0,9,3,"3",1.42857142857143,1.66666666666667,0.318524987580677,1.29099444873581,1,0,0 +"b-utils",-0.2233577064,1.2899551919,-0.5541961272,"https://salsa.debian.org/perl-team/modules/packages/libb-utils-perl","https://github.com/jbenjore/b-utils.git",1697.3214351852,0,9,0,2,12,0,0,12,1,"1",2,2,-1.15875517779013,1.4142135623731,1,0,0 +"libb2",0.4344926484,2.4059587424,-0.0945466725,"https://salsa.debian.org/debian/libb2","https://github.com/BLAKE2/libb2.git",2769.1435185185,5,14,0,15,43,0,0,44,2,"2",1.73684210526316,1.97727272727273,-0.421493343626073,1.40615529984164,1,1,0 +"backuppc-xs",0.0682740707,4.0111217079,-0.9932975309,"https://salsa.debian.org/debian/libbackuppc-xs-perl","https://github.com/backuppc/backuppc-xs.git",1496.301400463,2,5,0,2,11,0,0,11,1,"1",1.71428571428571,2,-1.29702849927471,1.4142135623731,1,1,0 +"libbase58",-0.3899391721,2.4680002613,-1.1487322403,"https://salsa.debian.org/debian/libbase58","https://github.com/luke-jr/libbase58",2238.1648148148,3,7,0,8,0,0,0,8,1,"1",1.7,1,-0.786731510558775,1,1,1,0 +"libbde",0.3715579957,2.3531465313,-0.2679169251,"https://salsa.debian.org/pkg-security-team/libbde","https://github.com/libyal/libbde",2546.6279398148,2,1,0,3,54,0,2,56,1,"1",1.33333333333333,1.96428571428571,-0.574552555818245,1.40152977645347,1.03571428571429,0,0 +"BerkeleyDB",0.094191881,0.6104187657,-0.0890236719,"https://salsa.debian.org/md/libberkeleydb-perl","https://github.com/pmqs/BerkeleyDB.git",5644.9127083333,1,4,0,3,5,0,0,5,4,"4",1.8,2,1.55662867912762,1.4142135623731,1,0,0 +"bio-alignio-stockholm",-4.9835930933,-2.6349248881,-5.4713428559,"https://salsa.debian.org/med-team/libbio-alignio-stockholm-perl","https://github.com/bioperl/bio-alignio-stockholm.git",10.2199305556,0,2,0,2,0,0,0,2,1,"1",2,1,-2.3192421364614,1,1,0,0 +"bio-cluster",-0.7997866799,1.4401770295,-1.3214678694,"https://salsa.debian.org/med-team/libbio-cluster-perl","https://github.com/bioperl/bio-cluster.git",7.3618171296,0,2,0,2,2,0,0,3,1,"1",2,1.66666666666667,-2.32120811381852,1.29099444873581,1,0,0 +"bio-db-embl",-3.9031050099,-1.6133202421,-4.3425936432,"https://salsa.debian.org/med-team/libbio-db-embl-perl","https://github.com/bioperl/bio-db-embl.git",156.3099421296,0,2,0,2,2,0,0,3,1,"1",2,1.66666666666667,-2.21875289336693,1.29099444873581,1,0,0 +"bioparser",-1.0837320242,1.8160602363,-1.7618255497,"https://salsa.debian.org/med-team/libbioparser-dev","https://github.com/rvaser/bioparser",2526.0444675926,2,4,0,2,7,0,0,7,1,"1",1.66666666666667,2,-0.588711070295582,1.4142135623731,1,1,0 +"bot-training",-3.2750745336,-1.1281011499,-3.7406250651,"https://salsa.debian.org/perl-team/modules/packages/libbot-training-perl","https://github.com/avar/bot-training.git",3166.8061805556,0,2,0,2,3,0,0,3,2,"2",2,2,-0.14795773715652,1.4142135623731,1,0,0 +"bpp-core",-0.3055083002,1.3427773866,-0.9266820803,"https://salsa.debian.org/med-team/libbpp-core","https://github.com/BioPP/bpp-core",4797.1825925926,3,24,0,9,13,0,0,14,3,"3",1.88888888888889,1.92857142857143,0.97351038951057,1.38873014965883,1,1,0 +"bpp-phyl",-0.6908318666,0.5108256238,-1.0987919805,"https://salsa.debian.org/med-team/libbpp-phyl","https://github.com/BioPP/bpp-phyl.git",5775.3533796296,2,40,0,11,26,0,0,30,4,"4",1.95238095238095,1.86666666666667,1.64635339189937,1.36626010212795,1,1,0 +"bpp-phyl-omics",-0.3598958857,2.0635272475,-1.1073993387,"https://salsa.debian.org/med-team/libbpp-phyl-omics","https://github.com/BioPP/bpp-phyl-omics.git",4025.9415046296,0,9,0,3,3,0,0,4,3,"3",2,1.75,0.443005720931664,1.3228756555323,1,0,0 +"bpp-popgen",-0.5271533507,1.1251682809,-1.1042333821,"https://salsa.debian.org/med-team/libbpp-popgen","https://github.com/BioPP/bpp-popgen",5514.9573032407,1,13,0,4,2,0,0,4,4,"4",1.92857142857143,1.5,1.46723776079523,1.22474487139159,1,1,0 +"bpp-qt",-0.0541983729,2.8865148932,-1.0203907927,"https://salsa.debian.org/med-team/libbpp-qt","https://github.com/BioPP/bpp-qt",5024.8754050926,0,12,0,3,1,0,0,3,4,"4",2,1.33333333333333,1.13013080551064,1.15470053837925,1,1,0 +"bpp-raa",-0.4695334076,2.4236088145,-1.4371504644,"https://salsa.debian.org/med-team/libbpp-raa","https://github.com/BioPP/bpp-raa",5066.2362962963,0,17,0,4,1,0,0,4,4,"4",2,1.25,1.15858124237481,1.11803398874989,1,0,0 +"bpp-seq",-0.7192518957,0.6394875381,-1.1233907337,"https://salsa.debian.org/med-team/libbpp-seq","https://github.com/BioPP/bpp-seq",5747.7503472222,1,22,0,5,7,0,0,9,4,"4",1.95652173913043,1.77777777777778,1.62736641391336,1.33333333333333,1,0,0 +"bpp-seq-omics",-0.4569335369,1.1913544639,-1.0602096041,"https://salsa.debian.org/med-team/libbpp-seq-omics","https://github.com/BioPP/bpp-seq-omics.git",4806.9277083333,0,14,0,4,5,0,0,6,3,"3",2,1.83333333333333,0.980213649330321,1.35400640077266,1,0,0 +"bultitude",-1.4773927994,1.1163772935,-2.107348178,"https://salsa.debian.org/clojure-team/libbultitude-clojure","https://github.com/TimoFreiberg/bultitude.git",2812.2660300926,1,20,0,15,5,0,0,18,2,"2",1.95238095238095,1.27777777777778,-0.391831161374697,1.13038833052088,1,0,0 +"Business-EDI",-3.9144500578,-1.6606272938,-4.344431509,"https://salsa.debian.org/perl-team/modules/packages/libbusiness-edi-perl","https://github.com/atz/Business-EDI.git",1031.8625925926,0,2,0,1,2,0,0,2,1,"1",2,2,-1.61649663925053,1.4142135623731,1,0,0 +"business-isbn",0.4456335938,2.2644684353,-0.07414136,"https://salsa.debian.org/perl-team/modules/packages/libbusiness-isbn-perl","https://github.com/briandfoy/business-isbn.git",5456.629849537,2,8,0,6,17,0,0,19,4,"4",1.8,1.89473684210526,1.42711673122475,1.37649440322337,1,0,0 +"libcaca",1.7158261148,2.8952023479,1.0094395421,"https://salsa.debian.org/multimedia-team/libcaca","https://github.com/cacalabs/libcaca.git",5032.4727199074,5,18,0,13,72,0,0,75,4,"4",1.78260869565217,1.96,1.13535668240026,1.4,1,0,0 +"cache-historical-perl",-2.3954691781,0.151997288,-2.9853546683,"https://salsa.debian.org/perl-team/modules/packages/libcache-historical-perl","https://github.com/mschilli/cache-historical-perl.git",1172.6421064815,1,1,0,2,0,0,0,2,1,"1",1.5,1,-1.51966026665064,1,1,0,0 +"Cache-Memcached-Fast",0.4990329576,3.9172913613,-0.4350811541,"https://salsa.debian.org/perl-team/modules/packages/libcache-memcached-fast-perl","https://github.com/JRaspass/Cache-Memcached-Fast.git",5347.5680324074,1,11,0,8,23,0,0,23,4,"4",1.91666666666667,2,1.35209764309011,1.4142135623731,1,1,0 +"libcap-ng",0.8396700265,1.681480669,0.3896198847,"https://salsa.debian.org/debian/libcap-ng","https://github.com/stevegrubb/libcap-ng",2330.4456365741,16,5,0,19,22,0,0,29,1,"1",1.23809523809524,1.75862068965517,-0.723255371219638,1.32612996710548,1,1,0 +"libcapi20",0.8368813861,2.3931041059,0.2031772198,"https://github.com/leggewie-DM/libcapi20","https://github.com/leggewie-DM/libcapi20",1469.2789236111,0,1,0,1,1,0,0,2,1,"1",2,1.5,-1.31561613723933,1.22474487139159,1,0,0 +"Catalyst-Authentication-Credential-HTTP",-0.5445869591,1.7237240173,-0.9848916986,"https://salsa.debian.org/perl-team/modules/packages/libcatalyst-authentication-credential-http-perl","https://github.com/perl-catalyst/Catalyst-Authentication-Credential-HTTP",3862.9087152778,0,7,0,7,0,0,0,7,3,"3",2,1,0.330862245652089,1,1,0,0 +"catalyst-dispatch-regex",-0.2606173856,1.8455952252,-0.6908933433,"https://salsa.debian.org/perl-team/modules/packages/libcatalyst-dispatchtype-regex-perl","https://github.com/mvgrimes/catalyst-dispatch-regex.git",733.893287037,0,2,0,2,3,0,0,3,1,"1",2,2,-1.82145733203203,1.4142135623731,1,1,0 +"Catalyst-Model-DBIC-Schema",0.0213319889,2.940935467,-0.7164785923,"https://salsa.debian.org/perl-team/modules/packages/libcatalyst-model-dbic-schema-perl","https://github.com/perl-catalyst/Catalyst-Model-DBIC-Schema",5560.3081828704,1,18,0,13,3,0,0,16,4,"4",1.94736842105263,1.1875,1.49843274475447,1.08972473588517,1,0,0 +"Catmandu-Atom",-2.0448922521,-0.090192519,-2.4689508151,"https://salsa.debian.org/perl-team/modules/packages/libcatmandu-atom-perl","https://github.com/LibreCat/Catmandu-Atom.git",2313.0128472222,0,6,0,5,2,0,0,5,1,"1",2,1.4,-0.735246661987045,1.18321595661992,1,1,0 +"Catmandu-FileStore",-4.6751603427,-1.9416786358,-5.4067542228,"https://salsa.debian.org/perl-team/modules/packages/libcatmandu-filestore-perl","https://github.com/LibreCat/Catmandu-FileStore.git",1680.9195138889,0,7,0,6,8,0,0,8,1,"1",2,2,-1.17003737729578,1.4142135623731,1,1,0 +"Catmandu-Importer-getJSON",-1.1909213366,1.1095653007,-1.9138474886,"https://salsa.debian.org/perl-team/modules/packages/libcatmandu-importer-getjson-perl","https://github.com/nichtich/Catmandu-Importer-getJSON.git",2053.8504513889,2,5,0,5,11,0,0,12,1,"1",1.71428571428571,1.91666666666667,-0.91351369554563,1.38443731048635,1,1,0 +"Catmandu-MAB2",-2.1995168172,-0.5970612736,-2.5957637184,"https://salsa.debian.org/perl-team/modules/packages/libcatmandu-mab2-perl","https://github.com/jorol/Catmandu-MAB2.git",2364.9603356482,0,4,0,2,7,0,0,7,1,"1",2,2,-0.699514145189051,1.4142135623731,1,1,0 +"Catmandu-RDF",-1.5674004847,0.7873124502,-2.1156699483,"https://salsa.debian.org/perl-team/modules/packages/libcatmandu-rdf-perl","https://github.com/LibreCat/Catmandu-RDF.git",3436.1034722222,1,7,0,4,19,0,1,21,2,"2",1.875,1.9047619047619,0.0372806697366045,1.38013111868471,1.04761904761905,1,0 +"Catmandu-SRU",-1.6347444625,0.7856473937,-2.213169114,"https://salsa.debian.org/perl-team/modules/packages/libcatmandu-sru-perl","https://github.com/LibreCat/Catmandu-SRU.git",3182.483275463,4,14,0,8,13,0,0,14,2,"2",1.77777777777778,1.92857142857143,-0.137174115578349,1.38873014965883,1,1,0 +"Catmandu-Store-MongoDB",-2.1900265394,0.0427518931,-2.6176713043,"https://salsa.debian.org/perl-team/modules/packages/libcatmandu-store-mongodb-perl","https://github.com/LibreCat/Catmandu-Store-MongoDB.git",3318.0048263889,0,6,0,4,6,0,0,6,2,"2",2,2,-0.0439544770226124,1.4142135623731,1,1,0 +"Catmandu-Wikidata",-1.8751171258,0.7106805559,-2.4545693893,"https://salsa.debian.org/perl-team/modules/packages/libcatmandu-wikidata-perl","https://github.com/nichtich/Catmandu-Wikidata.git",3124.955462963,0,3,0,1,4,0,1,5,2,"2",2,1.8,-0.176745105221792,1.34164078649987,1.2,1,0 +"cgi-application-server",-1.3503684925,1.1163471363,-2.0606594531,"https://salsa.debian.org/perl-team/modules/packages/libcgi-application-server-perl","https://github.com/rjbs/cgi-application-server.git",2084.0161111111,0,3,0,2,2,0,0,4,1,"1",2,1.5,-0.892763992809153,1.22474487139159,1,0,0 +"CGI-Expand",-0.5995119077,1.6030547825,-1.0867729842,"https://salsa.debian.org/perl-team/modules/packages/libcgi-expand-perl","https://github.com/bowman/CGI-Expand.git",1724.580462963,2,5,0,2,1,0,0,2,1,"1",1.71428571428571,1.5,-1.14000482628171,1.22474487139159,1,0,0 +"CGI-Session-ExpireSessions",-2.1411258628,-0.6175205041,-2.4722907936,"https://salsa.debian.org/perl-team/modules/packages/libcgi-session-expiresessions-perl","https://github.com/ronsavage/CGI-Session-ExpireSessions",152.6683333333,0,1,0,1,2,0,0,2,1,"1",2,2,-2.2212578046038,1.4142135623731,1,0,0 +"Chatbot-Eliza",-1.3144935043,1.2362568323,-1.8965557655,"https://salsa.debian.org/perl-team/modules/packages/libchatbot-eliza-perl","https://github.com/ggruen/Chatbot-Eliza",2872.7296875,1,4,0,2,0,0,0,2,2,"2",1.8,1,-0.350240726120916,1,1,1,0 +"chi-driver-redis",-1.0562831931,1.2500992113,-1.5273046989,"https://salsa.debian.org/perl-team/modules/packages/libchi-driver-redis-perl","https://github.com/rentrak/chi-driver-redis",2250.5063078704,1,6,0,4,5,0,0,6,1,"1",1.85714285714286,1.83333333333333,-0.778242310767147,1.35400640077266,1,0,0 +"libcitygml",-1.0898756324,0.0704593832,-1.422660328,"https://salsa.debian.org/debian-gis-team/libcitygml","https://github.com/jklimke/libcitygml.git",4063.0042476852,3,34,0,18,41,0,0,42,3,"3",1.91891891891892,1.97619047619048,0.468499640444261,1.4057704208691,1,1,0 +"class-c3-adopt-next",-0.163979537,2.015060941,-0.6012557543,"https://salsa.debian.org/perl-team/modules/packages/libclass-c3-adopt-next-perl","https://github.com/rafl/class-c3-adopt-next.git",539.1778587963,0,4,0,2,0,0,0,2,1,"1",2,1,-1.95539397692587,1,1,0,0 +"Class-Container",-0.0506280246,1.6643843634,-0.4036695635,"https://salsa.debian.org/perl-team/modules/packages/libclass-container-perl","https://github.com/kenahoo/Class-Container.git",1.6649189815,1,3,0,3,3,0,0,3,1,"1",1.75,2,-2.32512677312124,1.4142135623731,1,0,0 +"class-insideout",-0.6783523447,1.0454132392,-0.9711596731,"https://salsa.debian.org/perl-team/modules/packages/libclass-insideout-perl","https://github.com/dagolden/class-insideout.git",3195.8285300926,0,3,0,2,8,0,0,8,2,"2",2,2,-0.127994469946299,1.4142135623731,1,0,0 +"class-meta",-2.1588155835,0.1407589648,-2.6165631943,"https://salsa.debian.org/perl-team/modules/packages/libclass-meta-perl","https://github.com/theory/class-meta.git",2689.2590856482,0,3,0,2,3,0,0,3,1,"1",2,2,-0.476442522612898,1.4142135623731,1,1,0 +"class-refresh",-1.6945342203,0.5207835259,-2.147534344,"https://salsa.debian.org/perl-team/modules/packages/libclass-refresh-perl","https://github.com/doy/class-refresh.git",1057.1042708333,0,3,0,3,6,0,0,6,1,"1",2,2,-1.59913393858733,1.4142135623731,1,0,0 +"libcleri",-2.6428568291,0.0499127531,-3.28649977,"https://salsa.debian.org/siridb-team/libcleri","https://github.com/cesbit/libcleri.git",2711.9692592593,2,9,0,4,7,0,0,8,1,"1",1.81818181818182,1.875,-0.46082113869941,1.36930639376292,1,1,1 +"config-auto",0.2333854777,2.0661047236,-0.2396184716,"https://salsa.debian.org/perl-team/modules/packages/libconfig-auto-perl","https://github.com/jib/config-auto.git",2192.3712731482,2,3,0,1,2,0,0,3,1,"1",1.6,1.66666666666667,-0.818230983322938,1.29099444873581,1,0,0 +"Config-Identity",-1.1292654123,1.0457452223,-1.5624237769,"https://salsa.debian.org/perl-team/modules/packages/libconfig-identity-perl","https://github.com/dagolden/Config-Identity.git",2902.5731828704,0,4,0,3,2,0,0,4,2,"2",2,1.5,-0.329712626843262,1.22474487139159,1,0,0 +"perl-Convert-ASN1",0.4197948981,1.947299648,-0.0317401557,"https://salsa.debian.org/perl-team/modules/packages/libconvert-asn1-perl","https://github.com/gbarr/perl-Convert-ASN1.git",5538.4047453704,6,11,0,13,39,0,0,41,4,"4",1.64705882352941,1.95121951219512,1.48336628105974,1.39686059153916,1,1,0 +"convert-binhex",0.5297090391,2.6158283055,-0.0231792705,"https://salsa.debian.org/perl-team/modules/packages/libconvert-binhex-perl","https://github.com/stephenenelson/convert-binhex.git",816.5657407407,0,2,0,2,2,0,0,3,1,"1",2,1.66666666666667,-1.76459038946739,1.29099444873581,1,0,0 +"CPAN-DistnameInfo",0.2522399529,2.0212536151,-0.1714651554,"https://salsa.debian.org/perl-team/modules/packages/libcpan-distnameinfo-perl","https://github.com/gbarr/CPAN-DistnameInfo.git",2596.9826157407,4,4,0,6,11,0,0,16,1,"1",1.5,1.6875,-0.539915668494174,1.29903810567666,1,0,0 +"perl-crypt-cracklib",-0.6543542036,2.0569886418,-1.4105292586,"https://salsa.debian.org/perl-team/modules/packages/libcrypt-cracklib-perl","https://github.com/dsully/perl-crypt-cracklib.git",1122.6671643519,0,2,0,1,5,0,0,5,1,"1",2,2,-1.55403595088932,1.4142135623731,1,1,0 +"Crypt-DH-GMP",-0.2521104835,0.8592315725,-0.4600056877,"https://salsa.debian.org/perl-team/modules/packages/libcrypt-dh-gmp-perl","https://github.com/lestrrat/Crypt-DH-GMP.git",1507.2044791667,0,3,0,2,2,0,0,3,1,"1",2,1.66666666666667,-1.28952872489226,1.29099444873581,1,0,0 +"crypt-dh",-0.350596725,1.4226875994,-0.742243187,"https://salsa.debian.org/perl-team/modules/packages/libcrypt-dh-perl","https://github.com/wchristian/crypt-dh.git",6.7348726852,0,3,0,2,0,0,0,2,1,"1",2,1,-2.32163936282728,1,1,0,0 +"perl-Crypt-OpenSSL-Bignum",0.573671133,2.817673072,-0.0231679046,"https://salsa.debian.org/perl-team/modules/packages/libcrypt-openssl-bignum-perl","https://github.com/kmx/perl-Crypt-OpenSSL-Bignum.git",1031.4781134259,1,6,0,3,7,0,0,8,1,"1",1.85714285714286,1.875,-1.61676110647885,1.36930639376292,1,0,0 +"perl-crypt-openssl-pkcs10",-0.3431098229,2.5077909436,-1.1135889242,"https://salsa.debian.org/perl-team/modules/packages/libcrypt-openssl-pkcs10-perl","https://github.com/perl-openssl/perl-crypt-openssl-pkcs10.git",84.9646875,1,2,0,1,1,0,0,1,1,"1",1.66666666666667,2,-2.26782832678545,1.4142135623731,1,0,0 +"Crypt-OpenSSL-RSA",0.4685020789,2.4809174365,-0.0400198203,"https://salsa.debian.org/perl-team/modules/packages/libcrypt-openssl-rsa-perl","https://github.com/toddr/Crypt-OpenSSL-RSA.git",4592.8473842593,12,12,0,16,31,0,0,35,3,"3",1.5,1.88571428571429,0.832956697976621,1.37321312465119,1,1,0 +"crypt-saltedhash",-0.4905719307,1.6402467611,-0.9344153294,"https://salsa.debian.org/perl-team/modules/packages/libcrypt-saltedhash-perl","https://github.com/campus-explorer/crypt-saltedhash",137.0340162037,2,4,0,4,7,0,0,8,1,"1",1.66666666666667,1.875,-2.23201200112775,1.36930639376292,1,0,0 +"CSS-Tiny",-0.2187157738,2.0546898664,-0.9614626512,"https://salsa.debian.org/perl-team/modules/packages/libcss-tiny-perl","https://github.com/chorny/CSS-Tiny.git",2896.0719791667,1,2,0,3,0,0,0,3,2,"2",1.66666666666667,1,-0.3341845344867,1,1,0,0 +"libcue",1.3280527366,4.5646098156,0.2528534907,"https://salsa.debian.org/debian/libcue","https://github.com/lipnitsk/libcue",5295.1366435185,10,5,0,13,29,0,0,29,4,"4",1.33333333333333,2,1.31603227128905,1.4142135623731,1,1,0 +"libcypher-parser",-0.5122868361,1.7043358431,-0.9505714794,"https://github.com/cleishm/libcypher-parser","https://github.com/cleishm/libcypher-parser",2052.1131134259,4,8,0,4,34,0,1,35,1,"1",1.66666666666667,1.97142857142857,-0.914708738074686,1.40407570003493,1.02857142857143,1,0 +"Dancer-Plugin-REST",-1.332193545,1.346725582,-1.9482623921,"https://salsa.debian.org/perl-team/modules/packages/libdancer-plugin-rest-perl","https://github.com/perldancer/Dancer-Plugin-REST.git",1451.9472800926,1,5,0,2,4,0,0,6,1,"1",1.83333333333333,1.66666666666667,-1.32753785399458,1.29099444873581,1,0,0 +"perl-Data-Alias",0.1378605049,2.1486354011,-0.5977466385,"https://salsa.debian.org/perl-team/modules/packages/libdata-alias-perl","https://github.com/mvduin/perl-Data-Alias",610.4551041667,0,2,0,2,4,0,0,4,1,"1",2,2,-1.90636532424825,1.4142135623731,1,0,0 +"Data-Dumper-Concise",0.2663762197,2.5519999595,-0.2144683206,"https://salsa.debian.org/perl-team/modules/packages/libdata-dumper-concise-perl","https://github.com/p5sagit/Data-Dumper-Concise",2778.0428240741,1,3,0,2,0,0,0,2,2,"2",1.75,1,-0.415371881455502,1,1,0,0 +"Data-FormValidator",-0.452587545,1.1833831498,-0.804155609,"https://salsa.debian.org/perl-team/modules/packages/libdata-formvalidator-perl","https://github.com/dnmfarrell/Data-FormValidator.git",2189.7575578704,3,6,0,6,10,0,0,11,1,"1",1.66666666666667,1.90909090909091,-0.820028849358409,1.38169855941551,1,0,0 +"data-hal",-0.7708587998,2.2387120212,-1.7298903065,"https://salsa.debian.org/perl-team/modules/packages/libdata-hal-perl","https://github.com/sipwise/data-hal.git",3620.8497222222,0,13,0,10,4,0,0,12,2,"2",2,1.33333333333333,0.164359931535669,1.15470053837925,1,0,0 +"Data-OptList",0.4752078978,2.7815727481,-0.0271116591,"https://salsa.debian.org/perl-team/modules/packages/libdata-optlist-perl","https://github.com/rjbs/Data-OptList.git",5253.3015972222,0,2,0,2,5,0,0,5,4,"4",2,2,1.28725568285673,1.4142135623731,1,0,0 +"data-phrasebook",-2.0173455185,0.5053918978,-2.598257896,"https://salsa.debian.org/perl-team/modules/packages/libdata-phrasebook-perl","https://github.com/barbie/data-phrasebook.git",3782.0208333333,0,1,0,1,0,0,0,1,3,"3",2,1,0.275222835780457,1,1,0,0 +"perl-database-dumptruck",-2.6354712016,-0.053291936,-3.2800311486,"https://salsa.debian.org/perl-team/modules/packages/libdatabase-dumptruck-perl","https://github.com/lkundrak/perl-database-dumptruck.git",85.8566550926,0,1,0,1,1,0,0,2,1,"1",2,1.5,-2.26721477937533,1.22474487139159,1,0,0 +"DateTime-Format-Mail",0.3841471215,2.8615309864,-0.1765169258,"https://salsa.debian.org/perl-team/modules/packages/libdatetime-format-mail-perl","https://github.com/book/DateTime-Format-Mail.git",809.9546875,2,1,0,3,7,0,0,7,1,"1",1.33333333333333,2,-1.7691378580387,1.4142135623731,1,0,0 +"DBD-ODBC",-0.4492586589,-0.3647039199,-0.4605696828,"https://salsa.debian.org/perl-team/modules/packages/libdbd-odbc-perl","https://github.com/perl5-dbi/DBD-ODBC.git",4357.0500347222,1,12,0,8,22,0,0,22,3,"3",1.92307692307692,2,0.670761508015521,1.4142135623731,1,1,0 +"DBD-SQLite2",-0.2242626457,0.8599429182,-0.4391897101,"https://salsa.debian.org/perl-team/modules/packages/libdbd-sqlite2-perl","https://github.com/rurban/DBD-SQLite2",1683.3107175926,3,5,0,1,0,0,0,1,1,"1",1.625,1,-1.1683925677179,1,1,0,0 +"DBIx-Abstract",-0.7663996691,0.9860020058,-1.2168119968,"https://salsa.debian.org/perl-team/modules/packages/libdbix-abstract-perl","https://github.com/iarna/DBIx-Abstract.git",3028.2298842593,1,6,0,3,3,0,0,3,2,"2",1.85714285714286,2,-0.243278608006036,1.4142135623731,1,1,0 +"dbix-class-schema-loader",0.899902187,3.2743262714,-0.0171547791,"https://salsa.debian.org/perl-team/modules/packages/libdbix-class-schema-loader-perl","https://github.com/dbsrgits/dbix-class-schema-loader",5369.7104282407,13,29,0,32,33,0,0,52,4,"4",1.69047619047619,1.63461538461538,1.36732847628406,1.2785207798919,1,0,0 +"Debian-Copyright",0.0036003397,1.9825965853,-0.5566012214,"https://salsa.debian.org/perl-team/modules/packages/libdebian-copyright-perl","https://github.com/periapt/Debian-Copyright.git",467.6439236111,0,1,0,1,1,0,0,2,1,"1",2,1.5,-2.00459919585138,1.22474487139159,1,0,0 +"Devel-Cycle",0.2975717055,2.3628676137,-0.1689937232,"https://salsa.debian.org/perl-team/modules/packages/libdevel-cycle-perl","https://github.com/lstein/Devel-Cycle.git",24.4394791667,1,2,0,1,0,0,0,1,1,"1",1.66666666666667,1,-2.30946110036126,1,1,0,0 +"devel-symdump",0.1995761912,1.3405631393,-0.0953876401,"https://salsa.debian.org/debian/libdevel-symdump-perl","https://github.com/andk/devel-symdump",2899.582337963,0,6,0,4,4,0,0,5,2,"2",2,1.8,-0.331769904666156,1.34164078649987,1,0,0 +"Perl-Device-Cdio",-1.3704489286,-0.772668166,-1.5698638654,"https://salsa.debian.org/perl-team/modules/packages/libdevice-cdio-perl","https://github.com/rocky/Perl-Device-Cdio.git",3711.3743287037,0,4,0,1,6,0,0,6,2,"2",2,2,0.226628043426005,1.4142135623731,1,1,0 +"directory-scratch",-0.3578234126,3.2936545083,-1.4107895462,"https://salsa.debian.org/perl-team/modules/packages/libdirectory-scratch-perl","https://github.com/bobtfish/directory-scratch.git",1951.3868981482,1,5,0,4,1,0,0,4,1,"1",1.83333333333333,1.25,-0.983994112372155,1.11803398874989,1,0,0 +"p5-dist-inkt",-1.6527902396,0.7910520727,-2.1410543937,"https://salsa.debian.org/perl-team/modules/packages/libdist-inkt-perl","https://github.com/tobyink/p5-dist-inkt",2915.0334953704,0,1,0,1,4,0,0,4,2,"2",2,2,-0.321141696097519,1.4142135623731,1,0,0 +"p5-dist-inkt-role-test",-1.5942005273,1.6783425318,-2.409860989,"https://salsa.debian.org/perl-team/modules/packages/libdist-inkt-role-test-perl","https://github.com/tobyink/p5-dist-inkt-role-test",0.0739467593,0,1,0,1,0,0,0,1,1,"1",2,1,-2.32622113674454,1,1,0,0 +"dist-zilla-plugins-cjm",-0.7135120934,1.9137851349,-1.4906069541,"https://salsa.debian.org/perl-team/modules/packages/libdist-zilla-plugins-cjm-perl","https://github.com/madsen/dist-zilla-plugins-cjm",3005.9145833333,0,4,0,4,10,0,0,11,2,"2",2,1.90909090909091,-0.258628375422154,1.38169855941551,1,1,0 +"libdivsufsort",0.3802819676,3.1639307168,-0.2503528943,"https://salsa.debian.org/med-team/libdivsufsort","https://github.com/y-256/libdivsufsort.git",2687.7754050926,0,6,0,2,28,0,0,28,1,"1",2,2,-0.477463084760986,1.4142135623731,1,1,0 +"libdogleg",-0.2667101184,1.7245498351,-0.6711419661,"https://salsa.debian.org/science-team/libdogleg","https://github.com/dkogan/libdogleg.git",4490.860775463,0,5,0,2,1,0,0,2,3,"3",2,1.5,0.762804351397333,1.22474487139159,1,0,0 +"libeatmydata",0.3763000817,1.1375608394,0.0117248362,"https://salsa.debian.org/debian/libeatmydata","https://github.com/stewartsmith/libeatmydata.git",5640.2884027778,11,12,0,16,27,0,0,35,4,"4",1.52173913043478,1.77142857142857,1.55344781166034,1.33095025129738,1,1,0 +"Email-MIME-CreateHTML",-0.598597254,0.9396464518,-0.9866469243,"https://salsa.debian.org/perl-team/modules/packages/libemail-mime-createhtml-perl","https://github.com/vanstyn/Email-MIME-CreateHTML.git",1257.2075810185,1,3,0,3,9,0,0,10,1,"1",1.75,1.9,-1.46149119378529,1.37840487520902,1,0,0 +"end",-1.6952231001,0.2859980609,-2.1369126329,"https://salsa.debian.org/perl-team/modules/packages/libend-perl","https://github.com/Abigail/end.git",519.9620023148,0,1,0,0,1,0,0,1,1,"1",2,2,-1.96861176541416,1.4142135623731,1,0,0 +"libeot",0.4231617787,2.6750549846,-0.0161024184,"https://salsa.debian.org/fonts-team/libeot","https://github.com/umanwizard/libeot.git",3660.8458101852,1,5,0,4,6,0,0,9,2,"2",1.83333333333333,1.66666666666667,0.191871577012579,1.29099444873581,1,1,0 +"eval-closure",0.3725931069,2.6025825306,-0.0711445029,"https://salsa.debian.org/perl-team/modules/packages/libeval-closure-perl","https://github.com/doy/eval-closure.git",2047.9688310185,1,4,0,5,11,0,0,13,1,"1",1.8,1.84615384615385,-0.917559417582493,1.35873244097351,1,0,0 +"libevt",0.3231580646,2.9388038619,-0.3464543518,"https://salsa.debian.org/pkg-security-team/libevt","https://github.com/libyal/libevt",2794.588125,1,2,0,2,3,0,2,5,2,"2",1.66666666666667,1.6,-0.403991057065795,1.26491106406735,1.4,0,0 +"libevtx",0.4679040206,3.3941203575,-0.3128196542,"https://salsa.debian.org/pkg-security-team/libevtx","https://github.com/libyal/libevtx",2794.5568055556,0,1,0,1,24,0,2,26,2,"2",2,1.92307692307692,-0.404012600409026,1.38675049056307,1.07692307692308,0,0 +"libeXaDrums",-1.57576575,0.4655834923,-2.0471585802,"https://github.com/SpintroniK/libeXaDrums/tree/debian","https://github.com/SpintroniK/libeXaDrums",2888.0486342593,2,6,0,3,6,0,0,7,2,"2",1.75,1.85714285714286,-0.339703459758481,1.36277028773849,1,1,0 +"libexif-gtk",0.6899028208,2.4094585548,0.0374998074,"https://salsa.debian.org/debian-phototools-team/libexif-gtk","https://github.com/libexif/libexif-gtk.git",5131.8707407407,2,5,0,6,4,0,0,6,4,"4",1.71428571428571,1.66666666666667,1.20372844697889,1.29099444873581,1,0,0 +"ExtUtils-CBuilder",-0.5036465134,1.0344999475,-0.9863787578,"https://salsa.debian.org/perl-team/modules/packages/libextutils-cbuilder-perl","https://github.com/Perl-Toolchain-Gang/ExtUtils-CBuilder.git",4657.3346759259,8,12,0,11,12,0,0,17,3,"3",1.6,1.70588235294118,0.877314823894806,1.30609431242203,1,0,0 +"extutils-modulemaker",-1.6287177053,0.4949751478,-2.0632435211,"https://salsa.debian.org/perl-team/modules/packages/libextutils-modulemaker-perl","https://github.com/jkeenan/extutils-modulemaker.git",3844.1565972222,0,2,0,1,4,0,0,4,3,"3",2,2,0.317963443540141,1.4142135623731,1,0,0 +"libfcgi-debian",2.4025790949,4.8601691677,1.2415729675,"https://github.com/tehnick/libfcgi-debian","https://github.com/tehnick/libfcgi-debian",1176.1604513889,0,1,0,1,1,0,0,2,1,"1",2,1.5,-1.51724014351641,1.22474487139159,1,0,0 +"File-MimeInfo",1.3146582473,3.1446233838,0.4775906292,"https://salsa.debian.org/perl-team/modules/packages/libfile-mimeinfo-perl","https://github.com/mbeijen/File-MimeInfo.git",3834.7099189815,10,12,0,18,50,0,0,53,3,"3",1.54545454545455,1.94339622641509,0.311465466464658,1.39405746883516,1,1,0 +"File-Modified",-0.1454311962,1.4011585761,-0.5041124489,"https://salsa.debian.org/perl-team/modules/packages/libfile-modified-perl","https://github.com/neilb/File-Modified",2145.0378472222,1,2,0,1,0,0,0,1,1,"1",1.66666666666667,1,-0.850789678425527,1,1,0,0 +"file-save-home",-1.8007818428,0.3604487668,-2.2376298003,"https://salsa.debian.org/perl-team/modules/packages/libfile-save-home-perl","https://github.com/jkeenan/file-save-home",1776.9554861111,0,2,0,1,0,0,0,1,1,"1",2,1,-1.1039782261295,1,1,0,0 +"File-Touch",0.098284703,1.8336262821,-0.2560959194,"https://salsa.debian.org/perl-team/modules/packages/libfile-touch-perl","https://github.com/neilb/File-Touch",4116.4970486111,1,3,0,2,3,0,0,3,3,"3",1.75,2,0.505295113441562,1.4142135623731,1,0,0 +"perl-File-Write-Rotate",-1.0296556573,1.3459084629,-1.5005566671,"https://salsa.debian.org/perl-team/modules/packages/libfile-write-rotate-perl","https://github.com/sharyanto/perl-File-Write-Rotate.git",3146.8113888889,0,17,0,5,6,0,0,7,2,"2",2,1.85714285714286,-0.161711322762887,1.36277028773849,1,0,0 +"filehandle-unget",0.0063823885,1.5940372704,-0.2756601201,"https://salsa.debian.org/perl-team/modules/packages/libfilehandle-unget-perl","https://github.com/coppit/filehandle-unget.git",3647.0964930556,0,3,0,1,0,0,0,1,2,"2",2,1,0.182413993591693,1,1,0,0 +"Filesys-Notify-Simple",0.1924577796,2.7235880131,-0.2464440556,"https://salsa.debian.org/perl-team/modules/packages/libfilesys-notify-simple-perl","https://github.com/miyagawa/Filesys-Notify-Simple.git",4730.4164814815,0,13,0,9,27,0,0,27,3,"3",2,2,0.92758475847236,1.4142135623731,1,1,0 +"Filter",-0.2555356397,0.0318054425,-0.3077435742,"https://salsa.debian.org/debian/libfilter-perl","https://github.com/rurban/Filter",4868.3054861111,5,12,0,11,13,0,0,14,3,"3",1.70588235294118,1.92857142857143,1.02243286996874,1.38873014965883,1,0,0 +"filter-template",-1.0581574357,1.1903314595,-1.5773248661,"https://salsa.debian.org/perl-team/modules/packages/libfilter-template-perl","https://github.com/rcaputo/filter-template",1475.5620138889,0,1,0,1,0,0,0,1,1,"1",2,1,-1.31129426075025,1,1,0,0 +"libfixposix",-0.4206114577,2.0891396228,-0.9806467917,"https://salsa.debian.org/common-lisp-team/libfixposix","https://github.com/sionescu/libfixposix.git",4611.074537037,9,4,0,10,24,0,0,28,3,"3",1.30769230769231,1.85714285714286,0.845494398307149,1.36277028773849,1,1,0 +"libfizmo",0.6273284521,4.5692102059,-0.4878285416,"https://github.com/chrender/libfizmo","https://github.com/chrender/libfizmo",4850.5273958333,1,7,0,3,3,0,0,3,3,"3",1.875,2,1.01020406105543,1.4142135623731,1,0,0 +"libfsntfs",0.3317907898,2.8232850998,-0.2751892076,"https://salsa.debian.org/pkg-security-team/libfsntfs","https://github.com/libyal/libfsntfs.git",3331.7044212963,0,1,0,1,16,0,2,18,2,"2",2,1.88888888888889,-0.0345310954504362,1.37436854187255,1.11111111111111,0,0 +"libfte",-1.9268255727,0.4828975174,-2.5557399688,"https://github.com/kpdyer/libfte/tree/debian/unstable","https://github.com/kpdyer/libfte",519.2035763889,0,6,1,3,6,0,0,6,1,"1",2,2,-1.96913345506574,1.4142135623731,1,1,0 +"libfvde",0.9569035002,4.5103410226,-0.1365413277,"https://salsa.debian.org/pkg-security-team/libfvde","https://github.com/libyal/libfvde.git",3327.7584953704,0,1,0,1,79,0,2,81,2,"2",2,1.97530864197531,-0.0372453337842437,1.40545673785261,1.02469135802469,0,0 +"libfwnt",0.4678493195,3.4503175442,-0.3155910203,"https://salsa.debian.org/pkg-security-team/libfwnt","https://github.com/libyal/libfwnt",3707.8170833333,2,1,0,3,9,0,2,11,2,"2",1.33333333333333,1.81818181818182,0.224181162281145,1.34839972492648,1.18181818181818,0,0 +"libfwsi",0.4767451355,3.2824611568,-0.3244519074,"https://salsa.debian.org/pkg-security-team/libfwsi","https://github.com/libyal/libfwsi.git",3356.5179398148,0,1,0,1,19,0,2,21,2,"2",2,1.9047619047619,-0.0174629080530283,1.38013111868471,1.0952380952381,0,0 +"gclib",-1.2540063751,1.2393506434,-1.793979304,"https://salsa.debian.org/med-team/libgclib","https://github.com/gpertea/gclib",2782.2130555556,2,2,0,3,11,0,0,11,2,"2",1.5,2,-0.41250335265884,1.4142135623731,1,1,0 +"gdal-grass",0.1785470496,2.1229290789,-0.4698383341,"https://salsa.debian.org/debian-gis-team/gdal-grass","https://github.com/OSGeo/gdal-grass.git",695.4440625,6,4,0,13,3,0,0,13,1,"1",1.4,1.23076923076923,-1.84790495449208,1.10940039245046,1,0,0 +"geo-google-mapobject",-0.8736364381,1.4566987694,-1.3139869808,"https://salsa.debian.org/perl-team/modules/packages/libgeo-google-mapobject-perl","https://github.com/periapt/geo-google-mapobject.git",50.641099537,0,1,0,1,1,0,0,2,1,"1",2,1.5,-2.291438095431,1.22474487139159,1,0,0 +"geoip-api-perl",-0.1336111961,0.5223083889,-0.2976960926,"https://salsa.debian.org/perl-team/modules/packages/libgeo-ip-perl","https://github.com/maxmind/geoip-api-perl.git",4739.8765162037,5,12,0,10,18,0,0,22,3,"3",1.70588235294118,1.81818181818182,0.934091922915972,1.34839972492648,1,1,1 +"git-pureperl",-0.9270531395,0.744963627,-1.3901965303,"https://salsa.debian.org/perl-team/modules/packages/libgit-pureperl-perl","https://github.com/broquaint/git-pureperl.git",2866.3317824074,3,22,0,14,6,0,0,15,2,"2",1.88,1.4,-0.354641578945956,1.18321595661992,1,0,0 +"libgit2",0.7426843467,1.4899627881,0.3118438265,"https://salsa.debian.org/debian/libgit2","https://github.com/libgit2/libgit2.git",5520.8953703704,104,508,0,399,0,0,0,399,4,"4",1.83006535947712,1,1.4713223102102,1,1,1,0 +"gnupg-interface",0.1615830389,0.739184756,-0.1104590476,"https://salsa.debian.org/perl-team/modules/packages/libgnupg-interface-perl","https://github.com/bestpractical/gnupg-interface.git",5505.2035300926,4,10,0,13,15,0,0,22,4,"4",1.71428571428571,1.68181818181818,1.46052854590499,1.29684932888065,1,0,0 +"Graph-D3",-2.0103879366,0.5815176639,-2.5923181246,"https://salsa.debian.org/perl-team/modules/packages/libgraph-d3-perl","https://github.com/shoheik/Graph-D3.git",1331.9675925926,1,3,0,3,3,0,0,4,1,"1",1.75,1.75,-1.41006689108401,1.3228756555323,1,1,0 +"Graph-ReadWrite",0.0013928296,2.5958738365,-0.7361535942,"https://salsa.debian.org/perl-team/modules/packages/libgraph-readwrite-perl","https://github.com/neilb/Graph-ReadWrite.git",2428.8532986111,0,5,0,3,3,0,0,3,1,"1",2,2,-0.655564833268076,1.4142135623731,1,0,0 +"p5-graph-writer-dsm",-2.8359680573,-0.7007526287,-3.3075782595,"https://salsa.debian.org/perl-team/modules/packages/libgraph-writer-dsm-perl","https://github.com/joenio/p5-graph-writer-dsm.git",1743.0827777778,0,2,0,1,0,0,0,1,1,"1",2,1,-1.12727785342982,1,1,0,0 +"Graphics-ColorNames-WWW",-0.8846098514,1.1184900901,-1.3674713039,"https://salsa.debian.org/perl-team/modules/packages/libgraphics-colornames-www-perl","https://github.com/cfaerber/Graphics-ColorNames-WWW",3881.2659606482,0,3,0,1,0,0,0,1,3,"3",2,1,0.343489431266599,1,1,0,0 +"GraphViz",-0.0292832904,0.8748911062,-0.2131770807,"https://salsa.debian.org/perl-team/modules/packages/libgraphviz-perl","https://github.com/ronsavage/GraphViz.git",4149.5647685185,0,8,0,6,5,0,0,6,3,"3",2,1.83333333333333,0.52804102268308,1.35400640077266,1,0,0 +"libgtextutils",0.1810799898,2.3142226538,-0.6333026117,"https://salsa.debian.org/med-team/libgtextutils","https://github.com/agordon/libgtextutils.git",1379.9043171296,1,2,0,1,21,0,0,21,1,"1",1.66666666666667,2,-1.37709321195804,1.4142135623731,1,0,0 +"gzstream",-0.4604271748,1.0639003315,-0.7280422963,"https://salsa.debian.org/med-team/libgzstream","https://github.com/kanedo/gzstream.git",1271.8150115741,0,2,0,1,4,0,0,4,1,"1",2,2,-1.4514433498275,1.4142135623731,1,1,0 +"perl-html-stripscripts",-0.3606801075,1.7950802024,-0.7870879637,"https://salsa.debian.org/perl-team/modules/packages/libhtml-stripscripts-perl","https://github.com/clintongormley/perl-html-stripscripts.git",634.9694444444,1,1,0,2,4,0,0,4,1,"1",1.5,2,-1.8895029291199,1.4142135623731,1,0,0 +"html-template",0.2623998312,1.2787610043,-0.0168521747,"https://salsa.debian.org/perl-team/modules/packages/libhtml-template-perl","https://github.com/mpeters/html-template.git",2360.5546296296,1,10,0,6,17,0,0,17,1,"1",1.90909090909091,2,-0.702544647126423,1.4142135623731,1,0,0 +"HTML-Tiny",-0.2742049645,2.1158495273,-0.8034234216,"https://salsa.debian.org/perl-team/modules/packages/libhtml-tiny-perl","https://github.com/ap/HTML-Tiny.git",5143.9249537037,0,2,0,2,0,0,0,2,4,"4",2,1,1.21202003874276,1,1,0,0 +"HTTP-Message",1.2240574234,4.0822720732,0.2771667606,"https://salsa.debian.org/perl-team/modules/packages/libhttp-message-perl","https://github.com/libwww-perl/HTTP-Message.git",5655.1268518519,76,18,0,56,26,0,1,74,4,"4",1.19148936170213,1.35135135135135,1.56365456364898,1.16247638743819,1.01351351351351,1,1 +"HTTP-Proxy",-0.0949217121,1.2455203169,-0.6350123924,"https://salsa.debian.org/perl-team/modules/packages/libhttp-proxy-perl","https://github.com/book/HTTP-Proxy.git",4041.0415393519,7,1,0,8,15,0,0,18,3,"3",1.125,1.83333333333333,0.453392406808374,1.35400640077266,1,0,0 +"http-server-simple",0.8231195226,2.8527464993,0.0853932498,"https://salsa.debian.org/perl-team/modules/packages/libhttp-server-simple-perl","https://github.com/bestpractical/http-server-simple",2910.7674074074,4,11,0,11,4,0,0,12,2,"2",1.73333333333333,1.33333333333333,-0.324076160581145,1.15470053837925,1,0,0 +"HTTP-Server-Simple-PSGI",-0.1977126095,1.9180365026,-0.6285309261,"https://salsa.debian.org/perl-team/modules/packages/libhttp-server-simple-psgi-perl","https://github.com/miyagawa/HTTP-Server-Simple-PSGI.git",1409.5210763889,0,2,0,2,3,0,0,4,1,"1",2,1.75,-1.35672107502128,1.3228756555323,1,1,0 +"libhugetlbfs",-0.6583887261,1.4081810608,-1.179127099,"https://github.com/punitagrawal/libhugetlbfs.git","https://github.com/punitagrawal/libhugetlbfs.git",2039.1172800926,1,1,0,2,1,0,0,3,1,"1",1.5,1.33333333333333,-0.923648031329404,1.15470053837925,1,0,0 +"libics",-1.5487571477,-0.7977160114,-1.7237343016,"https://salsa.debian.org/med-team/libics","https://github.com/svi-opensource/libics",4511.1015277778,4,15,0,9,13,0,0,14,3,"3",1.78947368421053,1.92857142857143,0.776727123104052,1.38873014965883,1,0,0 +"Net-IDN-Encode",0.0249334359,3.9722760412,-1.0659289095,"https://salsa.debian.org/perl-team/modules/packages/libidna-punycode-perl","https://github.com/cfaerber/Net-IDN-Encode.git",3674.6395949074,6,7,0,3,12,0,0,12,2,"2",1.53846153846154,2,0.201359747841012,1.4142135623731,1,0,0 +"iksemel",1.4056706717,3.3010035011,0.531380273,"https://salsa.debian.org/debian/libiksemel","https://github.com/meduketto/iksemel",2285.3264351852,0,3,0,0,15,0,0,15,1,"1",2,2,-0.754290993352508,1.4142135623731,1,0,0 +"p5-image-exif",-0.3566210754,0.8027615419,-0.610345557,"https://salsa.debian.org/perl-team/modules/packages/libimage-exif-perl","https://github.com/arc/p5-image-exif.git",101.2955787037,2,2,0,1,1,0,0,2,1,"1",1.5,1.5,-2.25659498592637,1.22474487139159,1,0,0 +"Image-MetaData-JPEG",0.1782474931,2.8015789571,-0.5717239967,"https://salsa.debian.org/perl-team/modules/packages/libimage-metadata-jpeg-perl","https://github.com/rjbs/Image-MetaData-JPEG.git",1915.8586921296,1,3,0,2,0,0,0,2,1,"1",1.75,1,-1.00843248767822,1,1,0,0 +"image-size",0.2728915097,1.5941936935,-0.1459963248,"https://salsa.debian.org/perl-team/modules/packages/libimage-size-perl","https://github.com/rjray/image-size.git",4527.5378587963,0,12,0,10,14,0,0,14,3,"3",2,2,0.788032991626504,1.4142135623731,1,0,0 +"libinstpatch",0.3063715043,2.068273106,-0.0894533028,"https://salsa.debian.org/multimedia-team/libinstpatch","https://github.com/swami/libinstpatch",4470.7645833333,4,11,0,8,17,0,0,19,3,"3",1.73333333333333,1.89473684210526,0.748981016629701,1.37649440322337,1,0,0 +"p5-io-callback",-2.0212295476,0.6694774365,-2.7211969358,"https://salsa.debian.org/perl-team/modules/packages/libio-callback-perl","https://github.com/tobyink/p5-io-callback.git",2909.5988078704,0,1,0,1,0,0,0,1,2,"2",2,1,-0.324879991600722,1,1,0,0 +"IO-Digest",-0.1769998583,2.4353442239,-0.8553329296,"https://salsa.debian.org/perl-team/modules/packages/libio-digest-perl","https://github.com/clkao/IO-Digest.git",1863.0997106482,1,4,0,3,4,0,0,4,1,"1",1.8,2,-1.04472319679912,1.4142135623731,1,0,0 +"File-Flock",0.2170241797,2.8246432586,-0.6360167425,"https://salsa.debian.org/perl-team/modules/packages/libio-event-perl","https://github.com/muir/File-Flock.git",474.8396990741,0,4,0,4,6,0,0,6,1,"1",2,2,-1.99964952118188,1.4142135623731,1,0,0 +"LibIO-Interface-Perl",1.0184295465,4.1476474847,0.0508969184,"https://salsa.debian.org/perl-team/modules/packages/libio-interface-perl","https://github.com/lstein/LibIO-Interface-Perl.git",2278.4801041667,0,2,0,1,6,0,0,7,1,"1",2,1.85714285714286,-0.759000299721991,1.36277028773849,1,1,0 +"perl-io-socket-inet6",1.0536105818,2.554159089,0.3603685147,"https://salsa.debian.org/perl-team/modules/packages/libio-socket-inet6-perl","https://github.com/shlomif/perl-io-socket-inet6.git",5052.8307060185,0,3,0,1,0,0,0,1,4,"4",2,1,1.14936009435972,1,1,0,0 +"IPC-Run3",0.5630723174,3.202492468,-0.0863000736,"https://salsa.debian.org/perl-team/modules/packages/libipc-run3-perl","https://github.com/rjbs/IPC-Run3.git",1899.0353819445,8,2,0,10,19,0,0,20,1,"1",1.2,1.95,-1.02000454307496,1.39642400437689,1,0,0 +"ipc-system-simple",0.7025068064,3.3730782331,0.0378027178,"https://salsa.debian.org/perl-team/modules/packages/libipc-system-simple-perl","https://github.com/pjf/ipc-system-simple.git",5306.4576388889,4,11,0,8,42,0,0,42,4,"4",1.73333333333333,2,1.32381951316541,1.4142135623731,1,0,0 +"ITL",0.0254308757,1.554670546,-0.4274590481,"https://salsa.debian.org/islamic-team/libitl","https://github.com/arabeyes-org/ITL",3251.4730902778,2,13,0,6,19,0,0,19,2,"2",1.86666666666667,2,-0.0897188912459524,1.4142135623731,1,0,0 +"libitl-gobject",-0.7439913292,1.4835301757,-1.3690898031,"https://salsa.debian.org/islamic-team/libitl-gobject","https://github.com/aelmahmoudy/libitl-gobject.git",2211.2291898148,0,2,0,1,0,0,0,1,1,"1",2,1,-0.805259406746635,1,1,0,0 +"jbzip2",-0.1117625553,1.7645153992,-0.5532046545,"https://salsa.debian.org/java-team/libjbzip2-java","https://github.com/routeKIT/jbzip2.git",1394.2040046296,0,2,0,1,0,0,0,1,1,"1",2,1,-1.36725705164919,1,1,0,0 +"libjcat",-2.9665296188,-1.1386554909,-3.3229751102,"https://salsa.debian.org/efi-team/libjcat","https://github.com/hughsie/libjcat.git",1373.0888425926,7,5,0,7,13,0,0,14,1,"1",1.41666666666667,1.92857142857143,-1.38178129343721,1.38873014965883,1,1,0 +"jifty-dbi",-1.6146679558,0.7852306876,-2.2707603438,"https://salsa.debian.org/perl-team/modules/packages/libjifty-dbi-perl","https://github.com/bestpractical/jifty-dbi.git",2518.1463888889,1,16,0,21,6,0,0,25,1,"1",1.94117647058824,1.24,-0.594143830155644,1.113552872566,1,0,0 +"Lingua-EN-Inflect-Number",0.1280326899,2.5007020448,-0.4017863004,"https://salsa.debian.org/perl-team/modules/packages/liblingua-en-inflect-number-perl","https://github.com/neilbowers/Lingua-EN-Inflect-Number",2030.0671527778,1,2,0,1,0,0,0,1,1,"1",1.66666666666667,1,-0.929873237515469,1,1,0,0 +"Lingua-EN-Numbers-Ordinate",-0.5287396988,1.7136767904,-0.9568574903,"https://salsa.debian.org/perl-team/modules/packages/liblingua-en-numbers-ordinate-perl","https://github.com/neilb/Lingua-EN-Numbers-Ordinate",4119.2290856482,1,2,0,1,0,0,0,1,3,"3",1.66666666666667,1,0.507174368094268,1,1,0,0 +"Lingua-PT-Stemmer",-0.0370378021,1.7556059977,-0.4052943013,"https://salsa.debian.org/perl-team/modules/packages/liblingua-pt-stemmer-perl","https://github.com/neilb/Lingua-PT-Stemmer.git",472.7143518519,1,2,0,1,0,0,0,1,1,"1",1.66666666666667,1,-2.00111145914308,1,1,0,0 +"list-compare",0.3913134488,2.6930680807,-0.0910990527,"https://salsa.debian.org/perl-team/modules/packages/liblist-compare-perl","https://github.com/jkeenan/list-compare.git",5186.5518171296,4,4,0,6,7,0,0,7,4,"4",1.5,2,1.24134128524694,1.4142135623731,1,0,0 +"Locale-Maketext-Gettext",-0.4988694756,1.1302337571,-0.8279808959,"https://salsa.debian.org/perl-team/modules/packages/liblocale-maketext-gettext-perl","https://github.com/imacat/Locale-Maketext-Gettext.git",519.6569444444,0,2,0,1,0,0,0,1,1,"1",2,1,-1.96882160203589,1,1,1,0 +"locale-maketext-lexicon",0.161275632,1.8969602532,-0.2840997851,"https://salsa.debian.org/perl-team/modules/packages/liblocale-maketext-lexicon-perl","https://github.com/clintongormley/locale-maketext-lexicon.git",1951.7074074074,1,9,0,7,17,0,0,17,1,"1",1.9,2,-0.983773647382696,1.4142135623731,1,0,0 +"p5-Locales",-1.0439124558,1.1408551718,-1.4785456456,"https://salsa.debian.org/perl-team/modules/packages/liblocales-perl","https://github.com/drmuey/p5-Locales.git",1740.6568287037,0,3,0,2,4,0,0,4,1,"1",2,2,-1.12894656290294,1.4142135623731,1,0,0 +"liblockfile-debian",1.3452804851,2.1620317868,0.8349604945,"https://github.com/miquels/liblockfile-debian","https://github.com/miquels/liblockfile-debian",1484.1868055556,0,2,0,1,0,0,0,1,1,"1",2,1,-1.30536162526685,1,1,1,0 +"log-message-simple",0.207617298,1.6631748554,-0.0635138373,"https://salsa.debian.org/perl-team/modules/packages/liblog-message-simple-perl","https://github.com/jib/log-message-simple.git",1230.0807175926,0,3,0,2,1,0,0,2,1,"1",2,1.5,-1.48015063493274,1.22474487139159,1,0,0 +"libltc",0.2546232027,2.4814619881,-0.1954510519,"https://salsa.debian.org/multimedia-team/libltc","https://github.com/x42/libltc",3674.4912152778,2,8,0,6,48,0,0,50,2,"2",1.8,1.96,0.201257683664903,1.4,1,1,0 +"p5-lwp-useragent-chicaching",-0.7942219141,1.5178916477,-1.2272281043,"https://salsa.debian.org/perl-team/modules/packages/liblwp-useragent-chicaching-perl","https://github.com/kjetilk/p5-lwp-useragent-chicaching.git",1283.7690740741,0,1,0,1,3,0,0,3,1,"1",2,2,-1.44322064740188,1.4142135623731,1,0,0 +"magpie",-1.7158635114,1.197884825,-2.5208982983,"https://salsa.debian.org/perl-team/modules/packages/libmagpie-perl","https://github.com/tamarou/magpie.git",2275.6417824074,0,6,0,5,5,0,3,9,1,"1",2,1.55555555555556,-0.760952663214728,1.24721912892465,1.33333333333333,0,0 +"mail-mbox-messageparser",-0.0992180029,0.3833084593,-0.2549281336,"https://salsa.debian.org/perl-team/modules/packages/libmail-mbox-messageparser-perl","https://github.com/coppit/mail-mbox-messageparser.git",3258.3029513889,0,3,0,1,0,0,0,1,2,"2",2,1,-0.0850209138407887,1,1,0,0 +"perl5-MailTools",1.0529685668,2.1520713579,0.4690208845,"https://salsa.debian.org/perl-team/modules/packages/libmailtools-perl","https://github.com/markov2/perl5-MailTools",1648.7267013889,0,2,0,1,4,0,0,4,1,"1",2,2,-1.19218147411905,1.4142135623731,1,0,0 +"libmatemixer",0.5190776518,2.8714266987,-0.0439618764,"https://salsa.debian.org/debian-mate-team/libmatemixer","https://github.com/mate-desktop/libmatemixer.git",3404.5255092593,7,20,0,15,31,0,0,35,2,"2",1.74074074074074,1.88571428571429,0.015559502338384,1.37321312465119,1,0,0 +"perl-math-basecalc",-1.0492971392,0.7762474864,-1.6069135742,"https://salsa.debian.org/perl-team/modules/packages/libmath-basecalc-perl","https://github.com/kenahoo/perl-math-basecalc.git",3269.0290740741,0,8,0,2,5,0,0,5,2,"2",2,2,-0.0776428601438859,1.4142135623731,1,0,0 +"Math-GMP",-0.4977700318,1.2717897116,-0.9791927568,"https://salsa.debian.org/perl-team/modules/packages/libmath-gmp-perl","https://github.com/turnstep/Math-GMP.git",2969.082974537,1,6,0,5,6,0,0,6,2,"2",1.85714285714286,2,-0.283963307290626,1.4142135623731,1,1,0 +"Math-Random-ISAAC",0.6477137679,3.3609472371,-0.0377506361,"https://salsa.debian.org/perl-team/modules/packages/libmath-random-isaac-perl","https://github.com/jawnsy/Math-Random-ISAAC",2416.3080324074,0,1,0,1,1,0,0,1,1,"1",2,2,-0.664194200133379,1.4142135623731,1,0,0 +"Math-Random-ISAAC-XS",0.4200441154,2.426176795,-0.0688144675,"https://salsa.debian.org/perl-team/modules/packages/libmath-random-isaac-xs-perl","https://github.com/jawnsy/Math-Random-ISAAC-XS.git",2412.8853703704,0,1,0,1,0,0,0,1,1,"1",2,1,-0.666548507000499,1,1,1,0 +"math-random-oo",-1.3518748941,0.9987771421,-1.8072166016,"https://salsa.debian.org/perl-team/modules/packages/libmath-random-oo-perl","https://github.com/dagolden/math-random-oo.git",1499.3150694445,0,1,0,1,2,0,0,3,1,"1",2,1.66666666666667,-1.29495552172049,1.29099444873581,1,0,0 +"mce-perl",-0.2406488454,2.0794415417,-0.6733224842,"https://salsa.debian.org/perl-team/modules/packages/libmce-perl","https://github.com/marioroy/mce-perl.git",2944.7772337963,1,6,0,6,17,0,0,17,2,"2",1.85714285714286,2,-0.300682215473107,1.4142135623731,1,1,0 +"Memoize-ExpireLRU",0.1936518014,2.9309817533,-0.4019145174,"https://salsa.debian.org/perl-team/modules/packages/libmemoize-expirelru-perl","https://github.com/neilb/Memoize-ExpireLRU",624.640474537,1,2,0,1,0,0,0,1,1,"1",1.66666666666667,1,-1.8966077979385,1,1,0,0 +"Message-Passing",-1.5721707445,-0.5831799889,-1.7635460333,"https://salsa.debian.org/perl-team/modules/packages/libmessage-passing-perl","https://github.com/suretec/Message-Passing.git",2987.7789236111,1,15,0,11,14,0,0,16,2,"2",1.9375,1.875,-0.27110314148499,1.36930639376292,1,0,0 +"method-signatures-simple",-0.5051718146,2.287989514,-1.1367149384,"https://salsa.debian.org/perl-team/modules/packages/libmethod-signatures-simple-perl","https://github.com/rhesa/method-signatures-simple.git",4262.9309953704,0,6,0,2,4,0,0,4,3,"3",2,2,0.606020935245769,1.4142135623731,1,0,0 +"minIni",-0.452730067,0.8302579746,-0.745676424,"https://salsa.debian.org/yangfl-guest/minIni","https://github.com/compuphase/minIni",2280.3336342593,2,6,0,4,22,0,0,22,1,"1",1.75,2,-0.757725333459401,1.4142135623731,1,1,0 +"MLDBM",0.2556850889,2.2171328226,-0.1413700534,"https://salsa.debian.org/perl-team/modules/packages/libmldbm-perl","https://github.com/chorny/MLDBM.git",1906.0319791667,3,2,0,2,0,0,0,2,1,"1",1.4,1,-1.01519187483351,1,1,0,0 +"Module-CPANTS-Analyse",0.6092458087,3.4788905255,-0.4688881027,"https://salsa.debian.org/perl-team/modules/packages/libmodule-cpants-analyse-perl","https://github.com/cpants/Module-CPANTS-Analyse.git",5647.7312152778,8,20,0,23,21,0,0,33,4,"4",1.71428571428571,1.63636363636364,1.55856741283335,1.27920429813366,1,1,0 +"module-extract-use",-1.4214887251,0.7223462254,-1.8616614077,"https://salsa.debian.org/perl-team/modules/packages/libmodule-extract-use-perl","https://github.com/briandfoy/module-extract-use.git",2918.7995717593,0,7,0,4,8,0,0,8,2,"2",2,2,-0.318551168780292,1.4142135623731,1,0,0 +"Module-Find",0.5306890725,2.9619110746,-0.0631954531,"https://salsa.debian.org/perl-team/modules/packages/libmodule-find-perl","https://github.com/crenz/Module-Find.git",4710.686875,2,8,0,7,14,0,0,15,3,"3",1.8,1.93333333333333,0.91401358272587,1.39044357430761,1,0,0 +"module-install-readmefrompod",-1.8312131642,-0.8033082466,-2.0615814708,"https://salsa.debian.org/perl-team/modules/packages/libmodule-install-readmefrompod-perl","https://github.com/bingos/module-install-readmefrompod.git",2847.0250694445,0,7,0,6,4,0,0,6,2,"2",2,1.66666666666667,-0.367921863829096,1.29099444873581,1,0,0 +"Perl-Module-Install-XSUtil",-1.9528681484,-0.4161990227,-2.2440219121,"https://salsa.debian.org/perl-team/modules/packages/libmodule-install-xsutil-perl","https://github.com/gfx/Perl-Module-Install-XSUtil.git",1649.8556828704,0,9,0,3,4,0,0,6,1,"1",2,1.66666666666667,-1.19140489471214,1.29099444873581,1,0,0 +"Module-Manifest",-0.2750809802,2.0412664766,-0.7072069311,"https://salsa.debian.org/perl-team/modules/packages/libmodule-manifest-perl","https://github.com/karenetheridge/Module-Manifest",3547.1878935185,0,3,0,3,0,0,0,3,2,"2",2,1,0.113691023157636,1,1,0,0 +"module-manifest-skip-pm",-0.3311047045,2.0896483213,-0.8611240864,"https://salsa.debian.org/perl-team/modules/packages/libmodule-manifest-skip-perl","https://github.com/ingydotnet/module-manifest-skip-pm.git",1169.1213194445,0,5,0,3,11,0,0,11,1,"1",2,2,-1.52208206962425,1.4142135623731,1,0,0 +"p5-module-package-rdf",-1.9996964425,0.8089579857,-2.7247782661,"https://salsa.debian.org/perl-team/modules/packages/libmodule-package-rdf-perl","https://github.com/tobyink/p5-module-package-rdf",668.6822106481,0,1,0,1,0,0,0,1,1,"1",2,1,-1.86631331935856,1,1,0,0 +"module-signature",0.6153933477,2.3081438868,0.0588548985,"https://salsa.debian.org/perl-team/modules/packages/libmodule-signature-perl","https://github.com/audreyt/module-signature.git",4414.5291782407,0,17,0,11,23,0,0,23,3,"3",2,2,0.710299020290729,1.4142135623731,1,0,0 +"Module-Starter-Plugin-CGIApp",-1.0772217685,1.7774421629,-2.0362185062,"https://github.com/jaldhar/Module-Starter-Plugin-CGIApp","https://github.com/jaldhar/Module-Starter-Plugin-CGIApp",4024.0661921296,0,7,0,4,4,0,0,4,3,"3",2,2,0.441715771456952,1.4142135623731,1,0,0 +"p5-moops",-2.0160241228,0.1848579356,-2.5747690554,"https://salsa.debian.org/perl-team/modules/packages/libmoops-perl","https://github.com/tobyink/p5-moops",2419.9678819445,0,3,0,2,7,0,0,7,1,"1",2,2,-0.661676741849542,1.4142135623731,1,0,0 +"p5-moosex-attributetags",-1.484446991,0.7122802252,-1.9169457017,"https://salsa.debian.org/perl-team/modules/packages/libmoosex-attributetags-perl","https://github.com/tobyink/p5-moosex-attributetags",2042.2449074074,0,1,0,1,4,0,0,4,1,"1",2,2,-0.921496666577225,1.4142135623731,1,0,0 +"perl-mp3-info",0.9722005224,3.0635904685,0.1459746264,"https://salsa.debian.org/perl-team/modules/packages/libmp3-info-perl","https://github.com/JJ/perl-mp3-info.git",3267.4327777778,1,4,0,1,3,0,0,3,2,"2",1.8,2,-0.0787408859763259,1.4142135623731,1,1,0 +"libmsiecf",0.4655231291,3.4302212781,-0.3202002984,"https://salsa.debian.org/pkg-security-team/libmsiecf","https://github.com/libyal/libmsiecf.git",3548.1866898148,0,1,0,1,5,0,2,7,2,"2",2,1.71428571428571,0.114378053590034,1.30930734141595,1.28571428571429,0,0 +"multidimensional",0.6378488709,3.4059130057,-0.1088057954,"https://salsa.debian.org/perl-team/modules/packages/libmultidimensional-perl","https://github.com/ilmari/multidimensional",4293.3777314815,1,3,0,4,4,0,0,6,3,"3",1.75,1.66666666666667,0.626963978740235,1.29099444873581,1,0,0 +"libmurmurhash",-1.1606750215,1.2419656851,-1.5922212752,"https://salsa.debian.org/med-team/libmurmurhash","https://github.com/kloetzl/libmurmurhash.git",1568.0675578704,0,1,0,1,0,0,0,1,1,"1",2,1,-1.24766354434064,1,1,0,0 +"perl-nagios-object",-0.0287280626,2.4165825039,-0.5145037556,"https://salsa.debian.org/perl-team/modules/packages/libnagios-object-perl","https://github.com/duncs/perl-nagios-object.git",4719.3367939815,1,14,0,9,10,0,0,11,3,"3",1.93333333333333,1.90909090909091,0.919963502244077,1.38169855941551,1,0,0 +"libnatpmp",0.2543409022,1.1083518392,4.5219738185424e-05,"https://salsa.debian.org/miniupnp-team/libnatpmp","https://github.com/miniupnp/libnatpmp",3832.0982523148,3,20,0,19,24,0,0,26,3,"3",1.8695652173913,1.92307692307692,0.30966900958356,1.38675049056307,1,0,0 +"libnbcompat",-5.0470695639,-2.6158016281,-5.4799549879,"https://github.com/jgoerzen/libnbcompat","https://github.com/jgoerzen/libnbcompat",3888.0046759259,0,19,0,0,2,0,0,2,3,"3",2,2,0.348124713243712,1.4142135623731,1,0,0 +"libndp",0.413875636,2.2608821975,0.0018314313,"https://salsa.debian.org/debian/libndp","https://github.com/jpirko/libndp.git",3924.0402314815,9,4,0,9,18,0,0,20,3,"3",1.30769230769231,1.9,0.372912073195673,1.37840487520902,1,0,0 +"libneo4j-client",-0.4420044551,1.822604323,-1.1962509735,"https://github.com/cleishm/libneo4j-client","https://github.com/cleishm/libneo4j-client",1826.3064351852,2,5,0,3,62,0,1,63,1,"1",1.71428571428571,1.98412698412698,-1.0700317607619,1.40859042454753,1.01587301587302,1,1 +"p5-Net-DNS-Lite",-0.3886008757,1.7387555976,-0.810307745,"https://salsa.debian.org/perl-team/modules/packages/libnet-dns-lite-perl","https://github.com/kazuho/p5-Net-DNS-Lite.git",2215.0713888889,0,7,0,6,9,0,0,9,1,"1",2,2,-0.802616517800192,1.4142135623731,1,0,0 +"Net-IDN-Encode",0.2021202967,2.48699816,-0.240749263,"https://salsa.debian.org/perl-team/modules/packages/libnet-idn-encode-perl","https://github.com/cfaerber/Net-IDN-Encode.git",3674.6395949074,6,7,0,3,12,0,0,12,2,"2",1.53846153846154,2,0.201359747841012,1.4142135623731,1,0,0 +"perl-net-jabber-bot",-1.4064709925,2.213836255,-2.339836966,"https://salsa.debian.org/perl-team/modules/packages/libnet-jabber-bot-perl","https://github.com/toddr/perl-net-jabber-bot.git",4656.9431712963,0,12,0,5,11,0,1,12,3,"3",2,1.91666666666667,0.877045524142738,1.38443731048635,1.08333333333333,0,0 +"Net-LDAP-FilterBuilder",-1.0311673826,1.3164424951,-1.5505907465,"https://salsa.debian.org/perl-team/modules/packages/libnet-ldap-filterbuilder-perl","https://github.com/ollyg/Net-LDAP-FilterBuilder.git",3727.9931481482,1,4,0,2,2,0,0,2,2,"2",1.8,2,0.238059438147029,1.4142135623731,1,0,0 +"libnet-ldapapi-perl",0.3298012331,4.2171229252,-0.937584259,"https://github.com/whm/libnet-ldapapi-perl","https://github.com/whm/libnet-ldapapi-perl",2319.3761458333,0,8,0,3,3,0,0,3,1,"1",2,2,-0.730869613521349,1.4142135623731,1,1,0 +"Net-Netmask",0.1949090184,1.297397456,-0.0893189593,"https://salsa.debian.org/perl-team/modules/packages/libnet-netmask-perl","https://github.com/jmaslak/Net-Netmask.git",4478.3867592593,1,7,0,6,3,0,0,7,3,"3",1.875,1.42857142857143,0.75422399444375,1.19522860933439,1,0,0 +"Net-OpenID-Server",-1.0955544028,0.6845393717,-1.5372515082,"https://salsa.debian.org/perl-team/modules/packages/libnet-openid-server-perl","https://github.com/robn/Net-OpenID-Server.git",848.2155092593,2,3,0,3,3,0,0,4,1,"1",1.6,1.75,-1.74281983001379,1.3228756555323,1,0,0 +"Net-SMTP-TLS",-0.1132113761,2.611489661,-0.7024918462,"https://salsa.debian.org/perl-team/modules/packages/libnet-smtp-tls-butmaintained-perl","https://github.com/fayland/Net-SMTP-TLS",3215.1503240741,2,5,0,4,4,0,0,4,2,"2",1.71428571428571,2,-0.114703811457682,1.4142135623731,1,0,0 +"libnfo",-1.6756209904,0.1206412877,-2.1869772617,"https://salsa.debian.org/debian/libnfo","https://github.com/GeeXboX/libnfo",1108.0312384259,0,6,0,3,0,0,0,3,1,"1",2,1,-1.56410339562729,1,1,0,0 +"libnids",1.4807006894,2.868899345,0.7254298026,"https://salsa.debian.org/pkg-security-team/libnids","https://github.com/MITRECND/libnids.git",3593.0894791667,1,9,0,6,10,0,0,12,2,"2",1.9,1.83333333333333,0.145264814883204,1.35400640077266,1,0,0 +"number-fraction",-1.540099922,1.0079905103,-2.1216475277,"https://salsa.debian.org/perl-team/modules/packages/libnumber-fraction-perl","https://github.com/p5-number-fraction/number-fraction.git",5664.8216203704,3,11,0,5,9,0,0,9,4,"4",1.78571428571429,2,1.57032319170851,1.4142135623731,1,0,0 +"libofa",0.4733582109,1.4335688496,0.0963115975,"https://salsa.debian.org/debian/libofa","https://github.com/tanob/libofa.git",2279.4909837963,1,2,0,1,3,0,0,3,1,"1",1.66666666666667,2,-0.75830495766716,1.4142135623731,1,0,0 +"libolecf",0.4621655423,3.3267217863,-0.317708483,"https://salsa.debian.org/pkg-security-team/libolecf","https://github.com/libyal/libolecf.git",3351.0533101852,0,1,0,1,5,0,2,7,2,"2",2,1.71428571428571,-0.0212217995018929,1.30930734141595,1.28571428571429,0,0 +"libopenaptx",-1.7697893715,0.4021046488,-2.2318938305,"https://salsa.debian.org/debian/libopenaptx","https://github.com/pali/libopenaptx",1024.2505671296,0,2,0,2,31,0,0,31,1,"1",2,2,-1.62173263498323,1.4142135623731,1,0,0 +"pal",-0.7436164089,0.7988128956,-1.0249643964,"https://salsa.debian.org/med-team/libpal-java","https://github.com/tamuri/pal",382.9409953704,0,2,0,1,0,0,0,1,1,"1",2,1,-2.06286281740282,1,1,0,0 +"p5-Palm",0.0204029609,1.2197989009,-0.348294955,"https://salsa.debian.org/perl-team/modules/packages/libpalm-perl","https://github.com/madsen/p5-Palm",2036.3955092593,2,5,0,5,0,0,0,5,1,"1",1.71428571428571,1,-0.925520224287486,1,1,1,0 +"pam-encfs",-0.0672752006,1.0391890178,-0.5514410008,"https://salsa.debian.org/debian/libpam-encfs","https://github.com/tinti/pam-encfs",2773.2122222222,0,4,0,2,2,0,0,4,2,"2",2,1.5,-0.418694651565231,1.22474487139159,1,1,0 +"libpam-pwdfile",-0.1067432026,0.5002558718,-0.3226316808,"https://github.com/tiwe-de/libpam-pwdfile/tree/debian","https://github.com/tiwe-de/libpam-pwdfile",923.3027546296,2,2,0,2,8,0,0,9,1,"1",1.5,1.88888888888889,-1.69117043679372,1.37436854187255,1,0,0 +"PGObject-Type-DateTime",-1.4815397898,0.6709430232,-1.9159731716,"https://salsa.debian.org/perl-team/modules/packages/libpgobject-type-datetime-perl","https://github.com/ledgersmb/PGObject-Type-DateTime.git",3652.6989467593,0,8,0,4,6,0,0,6,2,"2",2,2,0.186267688489044,1.4142135623731,1,1,0 +"PGObject-Util-DBAdmin",-1.5448908629,0.6014090328,-1.9825388902,"https://salsa.debian.org/perl-team/modules/packages/libpgobject-util-dbadmin-perl","https://github.com/ledgersmb/PGObject-Util-DBAdmin.git",2615.9496412037,0,5,0,3,10,0,0,10,1,"1",2,2,-0.52686904051465,1.4142135623731,1,0,0 +"pgp-sign",-0.5037910117,2.2440221924,-1.3324653392,"https://salsa.debian.org/rra/libpgp-sign-perl","https://github.com/rra/pgp-sign",2555.0956134259,1,5,0,2,2,0,0,2,1,"1",1.83333333333333,2,-0.56872799531077,1.4142135623731,1,1,0 +"perl5-PGPLOT",-0.1986814175,1.8032644315,-0.9289181032,"https://salsa.debian.org/perl-team/modules/packages/libpgplot-perl","https://github.com/PDLPorters/perl5-PGPLOT.git",2564.25125,4,7,0,6,6,0,0,7,1,"1",1.63636363636364,1.85714285714286,-0.562430213693351,1.36277028773849,1,0,0 +"Plack-Middleware-CSRFBlock",-2.8898967554,-0.7198364868,-3.3240833199,"https://salsa.debian.org/perl-team/modules/packages/libplack-middleware-csrfblock-perl","https://github.com/mattp-/Plack-Middleware-CSRFBlock",1436.9725347222,1,7,0,3,3,0,0,4,1,"1",1.875,1.75,-1.33783835853689,1.3228756555323,1,1,0 +"Plack-Middleware-Deflater",-0.8686046005,1.4026303206,-1.3409550295,"https://salsa.debian.org/perl-team/modules/packages/libplack-middleware-deflater-perl","https://github.com/miyagawa/Plack-Middleware-Deflater.git",4308.6622222222,0,5,0,3,10,0,0,11,3,"3",2,1.90909090909091,0.637477544240498,1.38169855941551,1,0,0 +"Plack-Middleware-File-Sass",-3.742621833,-1.2109466542,-4.3202138211,"https://salsa.debian.org/perl-team/modules/packages/libplack-middleware-file-sass-perl","https://github.com/miyagawa/Plack-Middleware-File-Sass.git",372.7359490741,0,1,0,1,4,0,0,5,1,"1",2,1.8,-2.0698824443233,1.34164078649987,1,0,0 +"plack-test-anyevent",-2.2481916187,0.456054425,-2.955500627,"https://salsa.debian.org/perl-team/modules/packages/libplack-test-anyevent-perl","https://github.com/hoelzro/plack-test-anyevent.git",2226.7020138889,0,6,0,3,7,0,0,7,1,"1",2,2,-0.794616294579089,1.4142135623731,1,0,0 +"pod-2-docbook",-2.1858439437,0.1225281674,-2.6170683957,"https://salsa.debian.org/perl-team/modules/packages/libpod-2-docbook-perl","https://github.com/jozef/pod-2-docbook",1292.6652546296,0,6,0,3,2,0,0,3,1,"1",2,1.66666666666667,-1.4371013347889,1.29099444873581,1,0,0 +"libpod-webserver-perl",-0.4204997081,2.3714699089,-1.5368509522,"https://github.com/mogaal/libpod-webserver-perl","https://github.com/mogaal/libpod-webserver-perl",801.0357291667,1,1,0,1,1,0,0,2,1,"1",1.5,1.5,-1.77527283853769,1.22474487139159,1,0,0 +"Pod-Wordlist-hanekomu",-2.3524762868,-0.0387599898,-2.7860641364,"https://salsa.debian.org/perl-team/modules/packages/libpod-wordlist-hanekomu-perl","https://github.com/dagolden/Pod-Wordlist-hanekomu",1571.1035763889,0,3,0,2,0,0,0,2,1,"1",2,1,-1.24557519346943,1,1,0,0 +"poe-component-client-http",-1.0501503685,-0.2644618645,-1.3283877911,"https://salsa.debian.org/perl-team/modules/packages/libpoe-component-client-http-perl","https://github.com/rcaputo/poe-component-client-http",2297.0143402778,1,4,0,7,6,0,0,10,1,"1",1.8,1.6,-0.746251369537978,1.26491106406735,1,0,0 +"poe-component-client-ident",-2.7407891821,-1.3969533145,-3.0142475956,"https://salsa.debian.org/perl-team/modules/packages/libpoe-component-client-ident-perl","https://github.com/bingos/poe-component-client-ident.git",49.7081481481,0,1,0,1,0,0,0,1,1,"1",2,1,-2.29207983389008,1,1,0,0 +"poe-component-client-keepalive",-0.9123072197,1.3895866184,-1.3489172881,"https://salsa.debian.org/perl-team/modules/packages/libpoe-component-client-keepalive-perl","https://github.com/rcaputo/poe-component-client-keepalive.git",2357.5085300926,2,4,0,8,6,0,0,10,1,"1",1.66666666666667,1.6,-0.704639932310986,1.26491106406735,1,0,0 +"poe-filter-ircd",-0.3745579428,1.9358389215,-0.8315150468,"https://salsa.debian.org/perl-team/modules/packages/libpoe-filter-ircd-perl","https://github.com/bingos/poe-filter-ircd.git",1552.6868865741,0,4,0,3,1,0,0,3,1,"1",2,1.33333333333333,-1.25824326844496,1.15470053837925,1,0,0 +"poe-loop-tk",-0.195847078,2.023755452,-0.7553813013,"https://salsa.debian.org/perl-team/modules/packages/libpoe-loop-tk-perl","https://github.com/rcaputo/poe-loop-tk",2011.4116435185,0,7,0,11,1,0,0,12,1,"1",2,1.08333333333333,-0.942705586454392,1.04083299973307,1,0,0 +"Probe-Perl",-0.1208694783,2.6826431693,-0.7468528277,"https://salsa.debian.org/perl-team/modules/packages/libprobe-perl-perl","https://github.com/kenahoo/Probe-Perl",112.0281712963,0,2,0,1,0,0,0,1,1,"1",2,1,-2.24921248184925,1,1,0,0 +"perl-proc-processtable",0.037499403,0.4824843529,-0.0771518619,"https://salsa.debian.org/perl-team/modules/packages/libproc-processtable-perl","https://github.com/jwbargsten/perl-proc-processtable",3896.7371180556,1,25,0,20,24,0,0,25,3,"3",1.96153846153846,1.96,0.354131397003439,1.4,1,1,0 +"libpuzzle",-0.6680140267,0.6529557031,-1.1243331237,"https://salsa.debian.org/debian-phototools-team/libpuzzle","https://github.com/jedisct1/libpuzzle",2324.9386458333,1,8,0,5,25,0,0,26,1,"1",1.88888888888889,1.96153846153846,-0.727043401115104,1.40054934277178,1,0,0 +"libpwquality",0.5103514314,1.8778785061,0.0684762008,"https://salsa.debian.org/gnome-team/libpwquality","https://github.com/libpwquality/libpwquality.git",4429.9063773148,51,15,0,49,43,0,0,74,3,"3",1.22727272727273,1.58108108108108,0.720876355997807,1.25741046642736,1,1,0 +"libqcow",0.4345572635,3.1501552197,-0.2914212024,"https://salsa.debian.org/pkg-security-team/libqcow","https://github.com/libyal/libqcow.git",3715.7671527778,0,1,0,1,19,0,2,21,2,"2",2,1.9047619047619,0.229649684409515,1.38013111868471,1.0952380952381,0,0 +"p5-rdf-acl",-2.0654979491,1.2809082376,-3.0733910723,"https://salsa.debian.org/perl-team/modules/packages/librdf-acl-perl","https://github.com/tobyink/p5-rdf-acl",1688.9962731482,0,1,0,1,0,0,0,1,1,"1",2,1,-1.16448171051282,1,1,0,0 +"RDF-aREF",-1.6321655974,0.5126731294,-2.0632435211,"https://salsa.debian.org/perl-team/modules/packages/librdf-aref-perl","https://github.com/nichtich/RDF-aREF.git",2565.8667708333,2,8,0,4,11,0,1,12,1,"1",1.8,1.91666666666667,-0.561318964101455,1.38443731048635,1.08333333333333,1,0 +"RDF-Generator-Void",-1.6331954297,0.6259569496,-2.0634280229,"https://salsa.debian.org/perl-team/modules/packages/librdf-generator-void-perl","https://github.com/kjetilk/RDF-Generator-Void.git",1725.5093171296,0,6,0,4,4,0,0,5,1,"1",2,1.8,-1.13936590613144,1.34164078649987,1,0,0 +"RDF-Helper-Properties",-1.4850797677,1.0749945226,-2.1065327245,"https://salsa.debian.org/perl-team/modules/packages/librdf-helper-properties-perl","https://github.com/kjetilk/RDF-Helper-Properties.git",2324.5435416667,0,5,0,3,5,0,0,5,1,"1",2,2,-0.72731517683897,1.4142135623731,1,0,0 +"RDF-LinkedData",-1.5297189997,-0.0678424369,-2.0840021227,"https://salsa.debian.org/perl-team/modules/packages/librdf-linkeddata-perl","https://github.com/kjetilk/RDF-LinkedData.git",4060.5603472222,0,7,0,4,7,0,0,7,3,"3",2,2,0.466818582957311,1.4142135623731,1,0,0 +"p5-rdf-ns-curated",-1.1846297848,1.0171931504,-1.6213429531,"https://salsa.debian.org/perl-team/modules/packages/librdf-ns-curated-perl","https://github.com/kjetilk/p5-rdf-ns-curated.git",2949.064224537,0,4,0,3,5,0,0,5,2,"2",2,2,-0.297733372838046,1.4142135623731,1,1,0 +"RDF-NS",-0.5250160099,1.01221794,-0.8720836033,"https://salsa.debian.org/perl-team/modules/packages/librdf-ns-perl","https://github.com/nichtich/RDF-NS.git",4253.4168518519,2,5,0,4,13,0,0,13,3,"3",1.71428571428571,2,0.599476551611561,1.4142135623731,1,1,0 +"p5-rdf-query-client",-1.1913139725,0.7502046078,-1.7548289358,"https://salsa.debian.org/perl-team/modules/packages/librdf-query-client-perl","https://github.com/tobyink/p5-rdf-query-client",1767.4564930556,0,1,0,1,2,0,0,2,1,"1",2,2,-1.11051218839032,1.4142135623731,1,0,0 +"libSavitar",-0.0624513388,1.310740378,-0.382634692,"https://salsa.debian.org/3dprinting-team/libsavitar","https://github.com/Ultimaker/libSavitar.git",2417.8881481482,12,19,0,17,35,0,0,38,1,"1",1.61290322580645,1.92105263157895,-0.66310730423212,1.38602042971197,1,1,0 +"libsbsms",0.1678753971,1.6421405226,-0.1313541464,"https://salsa.debian.org/multimedia-team/libsbsms","https://github.com/claytonotey/libsbsms.git",571.9734837963,2,6,0,5,9,0,0,9,1,"1",1.75,2,-1.93283523045475,1.4142135623731,1,1,0 +"p5-scalar-does",-0.5366651555,1.2277898949,-0.9504713641,"https://salsa.debian.org/perl-team/modules/packages/libscalar-does-perl","https://github.com/tobyink/p5-scalar-does",1614.181099537,0,3,0,1,2,0,0,2,1,"1",2,2,-1.21594395688524,1.4142135623731,1,0,0 +"libscca",0.4636827697,3.5204192618,-0.331124383,"https://salsa.debian.org/pkg-security-team/libscca","https://github.com/libyal/libscca",3348.012650463,1,1,0,2,11,0,2,13,2,"2",1.5,1.84615384615385,-0.0233133428640955,1.35873244097351,1.15384615384615,0,0 +"SDL_net",0.2879256018,2.7048282977,-0.176557932,"https://salsa.debian.org/sdl-team/libsdl2-net","https://github.com/libsdl-org/SDL_net.git",5565.0336111111,10,12,0,14,0,0,0,14,4,"4",1.54545454545455,1,1.50168317031121,1,1,1,0 +"perl-SHARYANTO-Utils",-2.3441465625,-0.0852227274,-2.7855609174,"https://salsa.debian.org/perl-team/modules/packages/libsharyanto-utils-perl","https://github.com/perlancar/perl-SHARYANTO-Utils.git",2945.5977546296,0,13,0,2,4,0,0,5,2,"2",2,1.8,-0.30011781331725,1.34164078649987,1,0,0 +"simpleini",-3.1256993279,-0.5243099389,-3.727940764,"https://salsa.debian.org/yangfl-guest/simpleini","https://github.com/brofield/simpleini",5767.1290509259,12,11,0,17,66,0,0,66,4,"4",1.47826086956522,2,1.64069621823301,1.4142135623731,1,1,0 +"libsmdev",0.4901912636,3.5473022844,-0.3181659308,"https://salsa.debian.org/pkg-security-team/libsmdev","https://github.com/libyal/libsmdev",2801.6257060185,0,1,0,1,7,0,2,9,2,"2",2,1.77777777777778,-0.399150197775379,1.33333333333333,1.22222222222222,0,0 +"libsml",-2.5583752988,0.0607386648,-3.2378106609,"https://github.com/volkszaehler/libsml/tree/debian","https://github.com/volkszaehler/libsml",4561.3065740741,12,15,0,19,11,0,0,23,3,"3",1.55555555555556,1.47826086956522,0.811261086429,1.21583751774866,1,1,0 +"libsmraw",0.4741059034,3.3966321112,-0.3210256742,"https://salsa.debian.org/pkg-security-team/libsmraw","https://github.com/libyal/libsmraw.git",2800.5750925926,0,1,0,1,3,0,2,5,2,"2",2,1.6,-0.399872871056161,1.26491106406735,1.4,0,0 +"SNMP-Extension-PassPersist",0.1226846415,3.0805333609,-0.7398128832,"https://salsa.debian.org/perl-team/modules/packages/libsnmp-extension-passpersist-perl","https://github.com/maddingue/SNMP-Extension-PassPersist.git",1526.080787037,0,1,0,1,2,0,0,3,1,"1",2,1.66666666666667,-1.27654449777182,1.29099444873581,1,0,0 +"SOAP-WSDL",0.2494473126,2.2213700721,-0.2151765381,"https://salsa.debian.org/perl-team/modules/packages/libsoap-wsdl-perl","https://github.com/scrottie/SOAP-WSDL",3956.8486342593,2,7,0,5,8,0,0,8,3,"3",1.77777777777778,2,0.395479608968709,1.4142135623731,1,0,0 +"debian-libsodium",0.7652440851,2.6480355078,0.1255307975,"https://github.com/gcsideal/debian-libsodium","https://github.com/gcsideal/debian-libsodium",2198.6639814815,0,2,0,2,3,0,0,5,1,"1",2,1.6,-0.813902490973499,1.26491106406735,1,0,0 +"sort-naturally",0.7344792523,3.7354162178,-0.0108935716,"https://salsa.debian.org/perl-team/modules/packages/libsort-naturally-perl","https://github.com/bingos/sort-naturally.git",681.4402893519,0,3,0,3,6,0,0,7,1,"1",2,1.85714285714286,-1.85753756762529,1.36277028773849,1,0,0 +"term-ui",0.3980651932,2.5988929786,-0.0533124701,"https://salsa.debian.org/perl-team/modules/packages/libterm-ui-perl","https://github.com/jib/term-ui.git",4487.1224074074,4,10,0,11,10,0,0,11,3,"3",1.71428571428571,1.90909090909091,0.760232883490196,1.38169855941551,1,0,0 +"Test-Cmd",-1.4068778673,-0.2437675076,-1.6282879603,"https://salsa.debian.org/perl-team/modules/packages/libtest-cmd-perl","https://github.com/neilb/Test-Cmd.git",4572.2283101852,1,7,0,4,6,0,0,7,3,"3",1.875,1.85714285714286,0.818773694466039,1.36277028773849,1,0,0 +"test-compile",-0.1757790814,2.2630567936,-0.8030738551,"https://salsa.debian.org/perl-team/modules/packages/libtest-compile-perl","https://github.com/egiles/test-compile",5567.3756018519,2,14,0,11,11,0,0,12,4,"4",1.875,1.91666666666667,1.50329412833868,1.38443731048635,1,0,0 +"Test-Database",-1.833809135,0.6133274632,-2.3400867988,"https://salsa.debian.org/perl-team/modules/packages/libtest-database-perl","https://github.com/book/Test-Database.git",2702.2549537037,3,2,0,5,6,0,0,9,1,"1",1.4,1.66666666666667,-0.467503205474223,1.29099444873581,1,0,0 +"Test-File-Contents",-1.1809622978,0.4343778683,-1.4826469865,"https://salsa.debian.org/perl-team/modules/packages/libtest-file-contents-perl","https://github.com/ap/Test-File-Contents.git",4644.3475115741,2,4,0,3,8,0,0,9,3,"3",1.66666666666667,1.88888888888889,0.86838149367192,1.37436854187255,1,0,0 +"Test-Perl-Critic",0.2642060273,2.9016834456,-0.5237825629,"https://salsa.debian.org/perl-team/modules/packages/libtest-perl-critic-perl","https://github.com/Perl-Critic/Test-Perl-Critic.git",4634.7458449074,0,9,0,6,19,0,0,20,3,"3",2,1.95,0.861776906504143,1.39642400437689,1,1,0 +"Test-Pod-Coverage",-0.201777392,1.0831475883,-0.4327477008,"https://salsa.debian.org/perl-team/modules/packages/libtest-pod-coverage-perl","https://github.com/neilbowers/Test-Pod-Coverage",1677.1204166667,1,2,0,2,4,0,0,5,1,"1",1.66666666666667,1.8,-1.1726506182709,1.34164078649987,1,0,0 +"test-prereq",-1.8896057083,-0.3676533696,-2.1546117193,"https://salsa.debian.org/perl-team/modules/packages/libtest-prereq-perl","https://github.com/briandfoy/test-prereq.git",2918.7659375,4,8,0,7,13,0,0,14,2,"2",1.66666666666667,1.92857142857143,-0.31857430438842,1.38873014965883,1,0,0 +"Test-RDF",-1.5273740593,1.1507063443,-2.1229709088,"https://salsa.debian.org/perl-team/modules/packages/libtest-rdf-perl","https://github.com/kjetilk/Test-RDF.git",2744.0844328704,0,3,0,2,4,0,0,4,1,"1",2,2,-0.438730446438824,1.4142135623731,1,0,0 +"Test-RedisServer",-2.9408349327,-0.0880954323,-3.6685151023,"https://salsa.debian.org/perl-team/modules/packages/libtest-redisserver-perl","https://github.com/typester/Test-RedisServer.git",3497.317025463,0,12,0,6,19,0,0,19,2,"2",2,2,0.079386927146098,1.4142135623731,1,1,0 +"Test-Strict",0.0413930215,1.9710003237,-0.4917254856,"https://salsa.debian.org/perl-team/modules/packages/libtest-strict-perl","https://github.com/manwar/Test-Strict.git",2362.5205092593,1,15,0,11,23,0,0,23,1,"1",1.9375,2,-0.701192400289867,1.4142135623731,1,0,0 +"Test-XPath",-1.6970041276,0.5827254278,-2.146747561,"https://salsa.debian.org/perl-team/modules/packages/libtest-xpath-perl","https://github.com/manwar/Test-XPath.git",4673.8964699074,1,7,0,5,9,0,0,10,3,"3",1.875,1.9,0.888706993171515,1.37840487520902,1,0,0 +"Text-CSV_XS",0.3210443384,2.3035648179,-0.0928202393,"https://salsa.debian.org/perl-team/modules/packages/libtext-csv-xs-perl","https://github.com/Tux/Text-CSV_XS.git",5755.1094907407,9,17,0,13,37,0,0,39,4,"4",1.65384615384615,1.94871794871795,1.63242846267378,1.39596488090423,1,0,1 +"Text-Diff",0.3186250385,2.4917818706,-0.1685547916,"https://salsa.debian.org/perl-team/modules/packages/libtext-diff-perl","https://github.com/neilb/Text-Diff",2314.1856018519,0,6,0,3,4,0,0,4,1,"1",2,2,-0.734439972852009,1.4142135623731,1,0,0 +"p5-Text-FindIndent",-0.5555131835,1.6711252899,-1.0083252674,"https://salsa.debian.org/perl-team/modules/packages/libtext-findindent-perl","https://github.com/tsee/p5-Text-FindIndent.git",3337.1243287037,0,6,0,2,1,0,0,2,2,"2",2,1.5,-0.0308029665582304,1.22474487139159,1,0,0 +"text-markdown",0.9343197619,4.332977055,-0.1666854375,"https://salsa.debian.org/perl-team/modules/packages/libtext-markdown-perl","https://github.com/bobtfish/text-markdown.git",2874.5088194445,0,12,0,7,40,0,0,41,2,"2",2,1.97560975609756,-0.349016935250193,1.40556385699745,1,1,0 +"text-multimarkdown",0.2517262893,2.9301320017,-0.5540498908,"https://salsa.debian.org/perl-team/modules/packages/libtext-multimarkdown-perl","https://github.com/bobtfish/text-multimarkdown.git",2348.7609953704,0,10,0,6,15,0,0,18,1,"1",2,1.83333333333333,-0.710656997637393,1.35400640077266,1,0,0 +"Text-Soundex",0.8131696461,4.2054082056,0.0081736989,"https://salsa.debian.org/perl-team/modules/packages/libtext-soundex-perl","https://github.com/rjbs/Text-Soundex",1152.2136342593,3,2,0,3,0,0,0,3,1,"1",1.4,1,-1.53371216307441,1,1,0,0 +"perl-Text-sprintfn",-0.8179589658,2.1500712495,-1.6069534948,"https://salsa.debian.org/perl-team/modules/packages/libtext-sprintfn-perl","https://github.com/perlancar/perl-Text-sprintfn",2949.61625,0,11,0,2,2,0,0,3,2,"2",2,1.66666666666667,-0.297353657480726,1.29099444873581,1,0,0 +"thread_pool",-0.5406636263,1.505263536,-1.0728830879,"https://salsa.debian.org/med-team/libthread-pool","https://github.com/rvaser/thread_pool",1629.2300810185,1,4,0,1,6,0,0,6,1,"1",1.8,2,-1.20559238840958,1.4142135623731,1,1,0 +"libthumbor",-3.097994256,-0.4370183469,-3.7171702145,"https://salsa.debian.org/python-team/packages/libthumbor","https://github.com/thumbor/libthumbor",4029.2128125,6,18,0,14,40,0,7,48,3,"3",1.75,1.83333333333333,0.445255917562383,1.35400640077266,1.14583333333333,1,0 +"Tie-IxHash",0.7308735457,3.2747506675,0.0615000078,"https://salsa.debian.org/perl-team/modules/packages/libtie-ixhash-perl","https://github.com/chorny/Tie-IxHash.git",1314.8113773148,1,4,0,2,6,0,0,6,1,"1",1.8,2,-1.42186793804853,1.4142135623731,1,0,0 +"tools.logging",-0.0293820524,2.7335220749,-0.6673515718,"https://salsa.debian.org/clojure-team/libtools-logging-clojure","https://github.com/clojure/tools.logging.git",4541.1196180556,3,16,0,7,0,0,0,7,3,"3",1.84210526315789,1,0.797375318957123,1,1,1,1 +"p5-types-datetime",-1.2224253104,1.1350772403,-1.7134370382,"https://salsa.debian.org/perl-team/modules/packages/libtypes-datetime-perl","https://github.com/tobyink/p5-types-datetime",1190.8059837963,1,4,0,3,5,0,0,5,1,"1",1.8,2,-1.50716609087942,1.4142135623731,1,0,0 +"libunibreak",0.3910707314,2.538413373,-0.1234807159,"https://salsa.debian.org/qt-kde-team/3rdparty/libunibreak","https://github.com/adah1972/libunibreak.git",5748.0207407407,6,11,0,12,26,0,3,29,4,"4",1.64705882352941,1.89655172413793,1.6275524063691,1.37715348604937,1.10344827586207,1,0 +"libuninameslist",0.4875132738,2.4863001693,-0.0941545187,"https://salsa.debian.org/fonts-team/libuninameslist","https://github.com/fontforge/libuninameslist",5640.1865740741,5,13,0,13,19,0,0,20,4,"4",1.72222222222222,1.95,1.55337776793011,1.39642400437689,1,1,0 +"usbauth-all",-0.6014875746,1.9320845325,-1.2251803558,"https://salsa.debian.org/debian/libusbauth-configparser","https://github.com/kochstefan/usbauth-all.git",2917.2837384259,3,5,0,2,7,0,0,7,2,"2",1.625,2,-0.319593847486999,1.4142135623731,1,0,0 +"libverto",2.4189536777,5.947206779,1.0158918925,"https://salsa.debian.org/debian/libverto","https://github.com/latchset/libverto",3721.9244907408,8,2,0,9,9,0,0,14,2,"2",1.2,1.64285714285714,0.233885061111263,1.28173988892331,1,0,0 +"libvhdi",0.6481021454,3.1352052875,-0.1671545473,"https://salsa.debian.org/pkg-security-team/libvhdi","https://github.com/libyal/libvhdi.git",3717.6224074074,1,1,0,2,16,0,2,18,2,"2",1.5,1.88888888888889,0.230925836909383,1.37436854187255,1.11111111111111,0,0 +"vitacilina",-3.6021180136,-0.769754564,-4.2924781327,"https://salsa.debian.org/perl-team/modules/packages/libvitacilina-perl","https://github.com/damog/vitacilina.git",2796.7499884259,1,5,0,4,5,0,0,6,2,"2",1.83333333333333,1.83333333333333,-0.402504001126778,1.35400640077266,1,0,0 +"libvmdk",0.9664788559,4.388428618,-0.090886102,"https://salsa.debian.org/pkg-security-team/libvmdk","https://github.com/libyal/libvmdk.git",2936.766087963,2,1,0,3,29,0,2,31,2,"2",1.33333333333333,1.93548387096774,-0.306192749509172,1.3912166872805,1.06451612903226,0,0 +"perl5-XML-Compile-WSDL11",-1.4310286216,0.7419388273,-1.8594446745,"https://salsa.debian.org/perl-team/modules/packages/libxml-compile-wsdl11-perl","https://github.com/markov2/perl5-XML-Compile-WSDL11",1204.3164351852,0,2,0,1,0,0,0,1,1,"1",2,1,-1.49787281326716,1,1,1,0 +"XML-Encoding",-0.7093222742,1.489807431,-1.1875178918,"https://salsa.debian.org/perl-team/modules/packages/libxml-encoding-perl","https://github.com/steve-m-hay/XML-Encoding.git",2428.8622685185,1,1,0,1,0,0,0,1,1,"1",1.5,1,-0.655558663241833,1,1,0,0 +"perl-XML-Generator",-0.4859689923,1.0279841867,-0.8301607275,"https://salsa.debian.org/perl-team/modules/packages/libxml-generator-perl","https://github.com/timlegge/perl-XML-Generator",442.0406828704,0,3,0,2,0,0,0,2,1,"1",2,1,-2.02221060032098,1,1,0,0 +"XML-SAX-Expat",0.7084412925,2.9227171248,0.0786452436,"https://salsa.debian.org/perl-team/modules/packages/libxml-sax-expat-perl","https://github.com/hoehrmann/XML-SAX-Expat",2544.4844675926,0,4,0,2,2,0,0,2,1,"1",2,2,-0.576026961213125,1.4142135623731,1,0,0 +"xml-sax-machines",-0.9628604737,0.4253404586,-1.269754049,"https://salsa.debian.org/perl-team/modules/packages/libxml-sax-machines-perl","https://github.com/perigrin/xml-sax-machines.git",1529.9486111111,1,2,0,1,2,0,0,2,1,"1",1.66666666666667,2,-1.27388398245362,1.4142135623731,1,0,0 +"xml-sax",0.996402312,2.2577312148,0.3914828238,"https://salsa.debian.org/perl-team/modules/packages/libxml-sax-perl","https://github.com/grantm/xml-sax",3966.2573726852,0,6,0,3,4,0,0,5,3,"3",2,1.8,0.401951488823503,1.34164078649987,1,0,0 +"p5-xml-saxon-xslt2",-1.0066125051,2.2847267339,-1.8645802565,"https://salsa.debian.org/perl-team/modules/packages/libxml-saxon-xslt2-perl","https://github.com/tobyink/p5-xml-saxon-xslt2",1518.5208564815,0,1,0,1,2,0,0,2,1,"1",2,2,-1.28174465958428,1.4142135623731,1,0,0 +"xmlbird",0.3929313241,3.1477652867,-0.4381392316,"https://salsa.debian.org/fonts-team/libxmlbird","https://github.com/johanmattssonm/xmlbird.git",3048.2602777778,1,7,0,6,9,0,0,9,2,"2",1.875,2,-0.229500533366492,1.4142135623731,1,1,0 +"YAML-AppConfig",-0.2806665447,2.1538425871,-0.9966889755,"https://salsa.debian.org/perl-team/modules/packages/libyaml-appconfig-perl","https://github.com/Xaerxess/YAML-AppConfig",1551.2373611111,5,2,0,4,0,0,0,4,1,"1",1.28571428571429,1,-1.25924033672535,1,1,0,0 +"libydpdict",-1.336791229,0.3110794516,-1.7407427608,"https://github.com/porridge/libydpdict","https://github.com/porridge/libydpdict",5005.9569675926,1,3,0,2,1,0,0,2,4,"4",1.75,1.5,1.1171175991701,1.22474487139159,1,0,0 +"libzeep",-1.527909209,-0.6468594182,-1.7548572329,"https://salsa.debian.org/med-team/libzeep","https://github.com/mhekkel/libzeep.git",5502.8286342593,2,5,0,2,10,0,0,10,4,"4",1.71428571428571,2,1.45889495383291,1.4142135623731,1,1,0 +"20kly",1.4342234885,4.3783383344,0.2667152562,"https://salsa.debian.org/python-team/packages/lightyears","https://github.com/20kly/20kly.git",4073.732349537,0,3,0,1,5,0,0,5,3,"3",2,2,0.475879055527555,1.4142135623731,1,1,0 +"lilv",0.3731954954,1.1783141026,0.0585307699,"https://salsa.debian.org/multimedia-team/lilv","https://github.com/lv2/lilv.git",5733.8443518519,8,1,0,9,44,0,0,45,4,"4",1.11111111111111,1.97777777777778,1.61780105804693,1.40633487398193,1,1,0 +"limereg",0.2360714075,2.909288917,-0.7247260854,"https://salsa.debian.org/science-team/limereg","https://github.com/RoelofBerg/limereg.git",1172.0418171296,0,3,0,2,6,0,0,6,1,"1",2,2,-1.52007318072984,1.4142135623731,1,1,0 +"logtop",0.3498096662,3.7145308344,-0.5283480087,"https://github.com/JulienPalard/logtop","https://github.com/JulienPalard/logtop",3192.2077430556,0,9,0,4,8,0,0,8,2,"2",2,2,-0.130485058760922,1.4142135623731,1,1,0 +"lolcat",0.6721262935,3.1765432052,-0.1088405445,"https://salsa.debian.org/ruby-team/lolcat","https://github.com/busyloop/lolcat.git",3767.9154513889,1,19,0,15,63,0,0,72,3,"3",1.95,1.875,0.265520330182167,1.36930639376292,1,1,0 +"loqui",-1.7007984788,0.6039967407,-2.1464740031,"https://salsa.debian.org/debian/loqui","https://github.com/sunnyone/loqui.git",4178.2538078704,1,9,0,3,2,0,0,3,3,"3",1.9,1.66666666666667,0.547775019679304,1.29099444873581,1,0,0 +"lsmount",0.241790673,3.2370471304,-0.6151908303,"https://github.com/Llandon/lsmount","https://github.com/Llandon/lsmount",2894.8834259259,1,4,0,1,3,0,0,3,2,"2",1.8,2,-0.33500209082925,1.4142135623731,1,0,0 +"ltsp",-0.2605389691,-0.1270230433,-0.35762279,"https://github.com/ltsp/ltsp/","https://github.com/ltsp/ltsp",1481.8791782407,11,5,0,10,11,0,25,43,1,"1",1.3125,1.25581395348837,-1.30694894612281,1.12063105145644,1.58139534883721,1,0 +"luadbi",0.1585813148,2.686351466,-0.4949553216,"https://salsa.debian.org/lua-team/lua-dbi","https://github.com/mwild1/luadbi",2870.1189699074,1,15,0,9,30,0,0,31,2,"2",1.9375,1.96774193548387,-0.352036530173412,1.40276225194574,1,1,0 +"luaexpat",0.0739779286,0.7317384216,-0.0425516616,"https://salsa.debian.org/lua-team/lua-expat","https://github.com/lunarmodules/luaexpat",4256.8331365741,4,6,0,7,11,0,0,11,3,"3",1.6,2,0.601826471789061,1.4142135623731,1,1,0 +"linotify",-0.5779890984,2.143926952,-1.2238495501,"https://salsa.debian.org/lua-team/lua-inotify","https://github.com/hoelzro/linotify.git",2964.3124768519,3,9,0,8,16,0,0,18,2,"2",1.75,1.88888888888889,-0.28724473424374,1.37436854187255,1,1,0 +"lualdap",0.0504029107,1.7349223597,-0.4425312123,"https://salsa.debian.org/lua-team/lua-ldap","https://github.com/lualdap/lualdap.git",4408.7069791667,7,12,0,13,25,0,0,30,3,"3",1.63157894736842,1.83333333333333,0.706294171692334,1.35400640077266,1,0,1 +"say",0.0600475565,3.4355060639,-0.8262923484,"https://salsa.debian.org/lua-team/lua-say","https://github.com/lunarmodules/say.git",4008.0407638889,1,11,0,8,11,0,0,11,3,"3",1.91666666666667,2,0.430692545865948,1.4142135623731,1,1,1 +"lyaml",-0.3454983994,1.9583709762,-0.7980928636,"https://salsa.debian.org/lua-team/lua-yaml/","https://github.com/gvvaughan/lyaml",3607.2911111111,1,7,1,6,63,0,0,63,2,"2",1.875,2,0.155033526853468,1.4142135623731,1,1,0 +"lunar-date",-1.0901325066,-0.0609883227,-1.3741924046,"https://salsa.debian.org/chinese-team/lunar-date","https://github.com/yetist/lunar-date",5400.1525115741,1,8,0,2,12,0,0,12,4,"4",1.88888888888889,2,1.38826831932625,1.4142135623731,1,1,0 +"luola",-0.2736280431,0.4554221137,-0.5709254832,"https://salsa.debian.org/debian/luola","https://github.com/callaa/luola.git",0.009537037,0,1,0,1,2,0,0,3,1,"1",2,1.66666666666667,-2.32626544151371,1.29099444873581,1,0,0 +"lv2file",0.6267118175,3.5316112473,-0.3364614164,"https://salsa.debian.org/multimedia-team/lv2file","https://github.com/jeremysalwen/lv2file.git",4139.5358449074,2,9,0,4,7,0,0,9,3,"3",1.81818181818182,1.77777777777778,0.521142543232819,1.33333333333333,1,0,0 +"lwt",-0.134408789,0.9137216874,-0.5254639396,"https://salsa.debian.org/ocaml-team/lwt","https://github.com/ocsigen/lwt.git",5681.6560300926,82,99,0,111,0,0,0,111,4,"4",1.54696132596685,1,1.58190288201519,1,1,1,0 +"lxappearance",2.8189754808,5.1307581038,1.6743807599,"https://salsa.debian.org/lxde-team/lxappearance","https://github.com/lxde/lxappearance.git",4801.901712963,111,38,0,71,12,0,0,76,3,"3",1.25503355704698,1.15789473684211,0.976756476145678,1.07605517369794,1,0,0 +"lxsession",1.2116112613,1.9433064205,0.7300432073,"https://salsa.debian.org/lxde-team/lxsession","https://github.com/lxde/lxsession.git",5699.8882175926,92,44,0,68,24,0,0,80,4,"4",1.32352941176471,1.3,1.59444404552179,1.14017542509914,1,0,0 +"lz4json",-0.4492537171,1.9714794785,-0.9639366883,"https://github.com/kilobyte/lz4json/tree/debian","https://github.com/kilobyte/lz4json",1639.7853125,4,5,0,5,0,0,0,5,1,"1",1.55555555555556,1,-1.19833188366435,1,1,0,0 +"mac-fdisk-debian",2.7880780441,5.7864461789,1.4460748362,"https://github.com/glaubitz/mac-fdisk-debian","https://github.com/glaubitz/mac-fdisk-debian",0.0261342593,1,1,0,1,1,0,0,2,1,"1",1.5,1.5,-2.32625402497477,1.22474487139159,1,0,0 +"MACTelnet-Debian-Packaging",0.2259589335,2.9645776481,-0.5410252908,"https://github.com/haakonnessjoen/MACTelnet-Debian-Packaging","https://github.com/haakonnessjoen/MACTelnet-Debian-Packaging",1885.9548726852,0,3,0,1,3,0,0,3,1,"1",2,2,-1.02900208137751,1.4142135623731,1,0,0 +"magicrescue",0.5638588917,1.9092658203,-0.0393062113,"https://salsa.debian.org/pkg-security-team/magicrescue","https://github.com/jbj/magicrescue",1064.0338194445,1,3,0,2,2,0,0,2,1,"1",1.75,2,-1.59436739029684,1.4142135623731,1,1,0 +"magit-popup",0.2571268821,2.5085186003,-0.2260041619,"https://salsa.debian.org/emacsen-team/magit-popup","https://github.com/magit/magit-popup.git",3610.5775925926,17,32,0,43,14,0,0,53,2,"2",1.6530612244898,1.26415094339623,0.157294160780193,1.12434467286336,1,1,0 +"mando",-0.8468044385,1.2154767785,-1.3465386928,"https://salsa.debian.org/python-team/packages/mando","https://github.com/rubik/mando.git",3495.7249768519,7,5,0,9,21,0,0,21,2,"2",1.41666666666667,2,0.0782918231196465,1.4142135623731,1,0,0 +"manpages-zh",0.3013864409,1.4801748551,-0.1366673269,"https://salsa.debian.org/chinese-team/manpages-zh","https://github.com/man-pages-zh/manpages-zh",5615.6429976852,2,12,2,8,40,0,0,44,4,"4",1.85714285714286,1.90909090909091,1.53649526249679,1.38169855941551,1,1,0 +"manuel",-1.8188927476,0.9170806837,-2.5490910041,"https://salsa.debian.org/python-team/packages/manuel","https://github.com/benji-york/manuel",5520.6818171296,2,23,0,16,26,0,0,29,4,"4",1.92,1.89655172413793,1.47117541581751,1.37715348604937,1,0,0 +"marisa-trie",-0.2770059581,0.4130762278,-0.5523788144,"https://salsa.debian.org/input-method-team/marisa","https://github.com/s-yata/marisa-trie.git",1648.6119675926,1,9,0,7,42,0,0,42,1,"1",1.9,2,-1.19226039472576,1.4142135623731,1,1,0 +"mate-backgrounds",0.5159356315,3.1381456756,-0.0659273196,"https://salsa.debian.org/debian-mate-team/mate-backgrounds","https://github.com/mate-desktop/mate-backgrounds.git",4154.5609837963,7,18,0,16,26,0,0,30,3,"3",1.72,1.86666666666667,0.531477711380642,1.36626010212795,1,0,0 +"mate-user-guide",0.5094536603,3.3401486345,-0.0704353393,"https://salsa.debian.org/debian-mate-team/mate-user-guide","https://github.com/mate-desktop/mate-user-guide.git",2933.2399768519,5,16,0,11,19,0,0,21,2,"2",1.76190476190476,1.9047619047619,-0.30861821469193,1.38013111868471,1,0,0 +"mate-user-share",-0.0144878955,0.7287904866,-0.2142966004,"https://salsa.debian.org/debian-mate-team/mate-user-share","https://github.com/mate-desktop/mate-user-share.git",4144.6895601852,7,22,0,16,27,0,0,29,3,"3",1.75862068965517,1.93103448275862,0.524687569629973,1.3896166675593,1,0,0 +"mate-window-applets",-0.186625862,1.9636663587,-0.6313160521,"https://salsa.debian.org/debian-mate-team/mate-window-applets","https://github.com/ubuntu-mate/mate-window-applets.git",1140.5334375,6,3,0,6,20,0,0,20,1,"1",1.33333333333333,2,-1.54174648464705,1.4142135623731,1,1,0 +"maybe",-0.652177661,1.9314993227,-1.1686602213,"https://salsa.debian.org/debian/maybe","https://github.com/p-e-w/maybe",363.7199652778,0,2,1,2,60,0,0,60,1,"1",2,2,-2.07608416460302,1.4142135623731,1,1,0 +"marionette-collective",0.2172201034,1.7225219851,-0.4315505666,"https://salsa.debian.org/puppet-team/mcollective","https://github.com/puppetlabs/marionette-collective",3620.6848148148,74,101,0,96,3,0,0,99,2,"2",1.57714285714286,1.03030303030303,0.1642464985886,1.0150384378451,1,1,1 +"meanwhile",1.6225494468,3.5813327858,0.7214154539,"https://salsa.debian.org/debian/meanwhile","https://github.com/obriencj/meanwhile.git",352.0019560185,1,1,0,2,2,0,0,3,1,"1",1.5,1.66666666666667,-2.08414449582179,1.29099444873581,1,1,0 +"medusa",0.7418834796,1.8416337033,0.1473000467,"https://salsa.debian.org/pkg-security-team/medusa","https://github.com/jmk-foofus/medusa",2618.4448032407,4,10,0,10,71,0,0,71,1,"1",1.71428571428571,2,-0.525152722322909,1.4142135623731,1,1,0 +"memkind",-2.3338755247,-0.4330380435,-2.7754873055,"https://github.com/kilobyte/memkind/tree/debian","https://github.com/kilobyte/memkind",3438.6727199074,30,85,0,50,2,0,0,52,2,"2",1.73913043478261,1.03846153846154,0.0390479483645289,1.01904933073014,1,1,0 +"memtest86plus",2.2601852863,3.3021289749,1.5576924368,"https://salsa.debian.org/debian/memtest86plus","https://github.com/memtest86plus/memtest86plus.git",663.5358564815,15,10,0,12,7,0,0,15,1,"1",1.4,1.46666666666667,-1.86985328235347,1.211060141639,1,1,0 +"mercator",-0.2340868407,1.6571874232,-0.993372484,"https://salsa.debian.org/games-team/mercator","https://github.com/worldforge/mercator",5633.2390393519,0,7,0,5,5,0,0,7,4,"4",2,1.71428571428571,1.54859884774191,1.30930734141595,1,1,0 +"minidb",-0.4525684191,1.7891094238,-0.9018820656,"https://salsa.debian.org/mwerlen/minidb","https://github.com/thp/minidb.git",4339.2984953704,2,5,0,6,13,0,0,13,3,"3",1.71428571428571,2,0.65855096237996,1.4142135623731,1,1,0 +"minieigen",-0.2097696756,0.7860654925,-0.499567475,"https://salsa.debian.org/science-team/minieigen","https://github.com/eudoxos/minieigen",4093.4507523148,0,12,0,7,18,0,0,18,3,"3",2,2,0.48944252471223,1.4142135623731,1,0,0 +"mkalias",-0.7408475157,2.3071375002,-1.5762128281,"https://salsa.debian.org/ruby-team/mkalias","https://github.com/LucianoPC/mkalias",68.2117476852,0,3,0,2,2,0,0,3,1,"1",2,1.66666666666667,-2.27935197733115,1.29099444873581,1,0,0 +"mktorrent",0.2711814394,1.9101515608,-0.3158320018,"https://salsa.debian.org/debian/mktorrent","https://github.com/pobrn/mktorrent",4360.041099537,6,10,1,14,72,0,4,77,3,"3",1.625,1.93506493506494,0.67281893710357,1.39106611455564,1.05194805194805,0,0 +"mmtf-java",-5.037602316,-2.8514886182,-5.4781542553,"https://salsa.debian.org/debichem-team/mmtf-java","https://github.com/rcsb/mmtf-java.git",2412.8476967593,1,12,0,6,13,0,0,13,1,"1",1.92307692307692,2,-0.666574421110733,1.4142135623731,1,1,0 +"mmv",1.5597347679,2.9419260396,0.7739885392,"https://salsa.debian.org/debian/mmv","https://github.com/rrthomas/mmv.git",971.7580902778,1,1,0,2,10,0,0,10,1,"1",1.5,2,-1.65784002665333,1.4142135623731,1,1,0 +"mod_proxy_msrpc",-0.4686771794,2.4036030859,-1.2427083432,"https://github.com/bombadil/mod_proxy_msrpc/tree/debian/unstable","https://github.com/bombadil/mod_proxy_msrpc",805.3717013889,0,4,0,1,20,0,1,21,1,"1",2,1.95238095238095,-1.77229030357864,1.39727626201154,1.04761904761905,0,0 +"modem-cmd",-0.6052898943,1.7555013841,-1.1587030212,"https://salsa.debian.org/debian/modem-cmd","https://github.com/imZack/modem-cmd.git",939.0309143519,1,4,0,2,5,0,0,5,1,"1",1.8,2,-1.68035168985316,1.4142135623731,1,0,0 +"modplug-tools",0.4632988211,2.9493569553,-0.4712506177,"https://salsa.debian.org/multimedia-team/modplugtools","https://github.com/alexmyczko/modplug-tools",1743.9280324074,2,5,0,3,4,0,0,4,1,"1",1.71428571428571,2,-1.12669643792416,1.4142135623731,1,1,0 +"mom",-0.6777849161,1.9853085783,-1.5072869412,"https://salsa.debian.org/debian/mom","https://github.com/oVirt/mom",4972.7826157407,31,16,1,25,13,0,0,31,3,"3",1.34042553191489,1.41935483870968,1.09429834224877,1.19136679436254,1,0,0 +"mongo-c-driver",0.3915954735,1.6519342417,-0.0863313883,"https://github.com/mongodb/mongo-c-driver/tree/master","https://github.com/mongodb/mongo-c-driver",5226.5267939815,106,124,0,112,0,0,0,112,4,"4",1.53913043478261,1,1.26883840926854,1,1,0,1 +"montage-wrapper",-0.3865274729,1.1809812531,-0.6680117033,"https://salsa.debian.org/debian-astro-team/montage-wrapper","https://github.com/astropy/montage-wrapper",3566.7960416667,2,16,3,14,39,0,0,42,2,"2",1.88888888888889,1.92857142857143,0.127178652768088,1.38873014965883,1,0,0 +"mopidy-alsamixer",-0.098708743,2.9303656044,-0.8810971993,"https://salsa.debian.org/mopidy-team/mopidy-alsamixer","https://github.com/mopidy/mopidy-alsamixer",3286.4480439815,1,5,0,5,39,0,0,39,2,"2",1.83333333333333,2,-0.0656610751976014,1.4142135623731,1,0,0 +"mopidy-beets",-0.6046887672,2.3676499619,-1.3922973554,"https://salsa.debian.org/mopidy-team/mopidy-beets","https://github.com/mopidy/mopidy-beets",3887.5415162037,2,10,0,7,27,0,0,27,3,"3",1.83333333333333,2,0.347806124933572,1.4142135623731,1,0,0 +"mopidy-dleyna",-0.6150387258,1.8626619639,-1.276416264,"https://salsa.debian.org/mopidy-team/mopidy-dleyna","https://github.com/tkem/mopidy-dleyna.git",2554.9614351852,1,6,0,4,25,0,0,25,1,"1",1.85714285714286,2,-0.56882029094209,1.4142135623731,1,0,0 +"mp3wrap",0.1511883249,2.4047625906,-0.4072551552,"https://github.com/marciosouza20/mp3wrap.git","https://github.com/marciosouza20/mp3wrap.git",36.6266319444,0,2,0,1,0,0,0,1,1,"1",2,1,-2.30107806482781,1,1,0,0 +"mpc123",0.851583608,3.5692284528,-0.2366259159,"https://salsa.debian.org/debian/mpc123","https://github.com/bucciarati/mpc123",4095.7045717593,0,4,0,1,2,0,0,2,3,"3",2,2,0.490992833372003,1.4142135623731,1,1,0 +"mpdscribble",-0.7233101544,-0.5981438455,-0.7658816633,"https://salsa.debian.org/mpd-team/mpdscribble","https://github.com/MusicPlayerDaemon/mpdscribble.git",5474.3595486111,22,17,0,29,73,0,0,90,4,"4",1.43589743589744,1.81111111111111,1.43931225384161,1.34577528254576,1,0,0 +"mruby",-1.5514391,-1.3019492907,-1.6243857492,"https://github.com/mruby-debian/mruby","https://github.com/mruby-debian/mruby",4156.8421527778,37,353,0,255,2,0,32,288,3,"3",1.9051282051282,1.00694444444444,0.533046832649452,1.00346621489936,1.11111111111111,1,1 +"msgpuck",-1.9345101796,0.7538606408,-2.5762644187,"https://github.com/rtsisyk/msgpuck","https://github.com/rtsisyk/msgpuck",1946.1415046296,3,13,1,11,15,0,0,21,1,"1",1.8125,1.71428571428571,-0.987602200418269,1.30930734141595,1,1,0 +"msitools",0.9685786476,3.4437444916,0.0488138918,"https://salsa.debian.org/debian/msitools","https://github.com/GNOME/msitools",4016.1692361111,45,59,0,69,4,0,0,71,3,"3",1.56730769230769,1.05633802816901,0.436283783845346,1.0277830647413,1,1,0 +"mt-st",0.1082142752,0.6983439611,-0.1608193497,"https://salsa.debian.org/debian/mt-st","https://github.com/iustin/mt-st",3093.7365972222,14,5,0,10,19,0,0,20,2,"2",1.26315789473684,1.95,-0.198219264575744,1.39642400437689,1,1,0 +"mtpolicyd",-1.3311506647,1.0954039333,-1.9915905372,"https://salsa.debian.org/debian/mtpolicyd","https://github.com/benningm/mtpolicyd.git",2186.9926157407,1,4,0,3,21,0,0,21,1,"1",1.8,2,-0.821930738055795,1.4142135623731,1,1,0 +"mtree-netbsd",-1.5216638363,0.5725600433,-2.0355608409,"https://github.com/jgoerzen/mtree-netbsd","https://github.com/jgoerzen/mtree-netbsd",1538.1956712963,1,7,0,0,1,0,0,1,1,"1",1.875,2,-1.26821117274653,1.4142135623731,1,0,0 +"MU-CITE",-0.9256165282,0.9613021982,-1.3098678212,"https://salsa.debian.org/debian/mu-cite","https://github.com/cvs-m17n-org/MU-CITE",4190.5202430556,2,3,0,4,3,0,0,5,3,"3",1.6,1.6,0.556212590283532,1.26491106406735,1,0,0 +"mudita24",-0.0566417905,1.5271069455,-0.4568909604,"https://salsa.debian.org/multimedia-team/mudita24","https://github.com/NielsMayer/mudita24",2005.0215046296,0,5,0,2,9,0,0,11,1,"1",2,1.81818181818182,-0.947101097230903,1.34839972492648,1,0,0 +"mugshot",0.7316630016,2.7960037279,-0.1554059373,"https://salsa.debian.org/python-team/packages/mugshot","https://github.com/bluesabre/mugshot",3560.1744907408,3,9,0,7,25,0,1,28,2,"2",1.75,1.89285714285714,0.122623963275726,1.37581144887559,1.03571428571429,1,0 +"mupen64plus-video-glide64",0.1160309114,2.3242018271,-0.3185351881,"https://salsa.debian.org/games-team/mupen64plus-video-glide64","https://github.com/mupen64plus/mupen64plus-video-glide64",4871.8438310185,2,17,0,10,7,0,0,11,3,"3",1.89473684210526,1.63636363636364,1.02486675027117,1.27920429813366,1,0,0 +"mupen64plus-video-z64",-0.0630178119,1.307530126,-0.3263531841,"https://salsa.debian.org/games-team/mupen64plus-video-z64","https://github.com/mupen64plus/mupen64plus-video-z64",4885.8515046296,2,17,0,10,9,0,0,12,3,"3",1.89473684210526,1.75,1.03450204637066,1.3228756555323,1,0,0 +"muse",0.9834892976,2.8604314623,0.0726359102,"https://salsa.debian.org/emacsen-team/muse-el","https://github.com/alexott/muse",5662.6274884259,5,7,0,9,14,0,0,76,4,"4",1.58333333333333,1.18421052631579,1.56881393959759,1.08821437516502,1,0,0 +"mwrap",-0.6055213344,1.7500683415,-1.3620779276,"https://salsa.debian.org/pkg-octave-team/mwrap","https://github.com/zgimbutas/mwrap",3042.6040856482,0,5,0,3,5,0,0,5,2,"2",2,2,-0.233391192692044,1.4142135623731,1,0,0 +"nasty",1.7398622788,6.040628791,0.3559757417,"https://salsa.debian.org/pkg-security-team/nasty","https://github.com/folkertvanheusden/nasty",2093.1121412037,0,4,0,2,1,0,0,3,1,"1",2,1.33333333333333,-0.886507212011331,1.15470053837925,1,0,0 +"natsort",0.2307395007,2.1095787345,-0.2397860986,"https://salsa.debian.org/python-team/packages/natsort","https://github.com/SethMMorton/natsort.git",4065.0547106482,9,17,0,19,20,0,1,38,3,"3",1.65384615384615,1.52631578947368,0.469910068637983,1.23544153624268,1.02631578947368,0,1 +"repairer",0.924989159,3.2280109324,0.0005519878,"https://salsa.debian.org/l10n-korean-team/nautilus-filename-repairer","https://github.com/choehwanjin/repairer",2878.1959953704,0,1,0,1,3,0,1,4,2,"2",2,1.75,-0.346480680280003,1.3228756555323,1.25,0,0 +"nb2plots",-1.170670669,1.5589366654,-1.743374148,"https://salsa.debian.org/python-team/packages/nb2plots","https://github.com/matthew-brett/nb2plots.git",2904.4454282408,2,7,0,6,21,0,0,22,2,"2",1.77777777777778,1.95454545454545,-0.32842478711944,1.39805059083906,1,0,0 +"nbtscan",0.2989992596,1.090810849,-0.0722586258,"https://salsa.debian.org/pkg-security-team/nbtscan","https://github.com/resurrecting-open-source-projects/nbtscan",1167.6364699074,1,3,0,3,5,0,0,5,1,"1",1.75,2,-1.52310343586609,1.4142135623731,1,1,1 +"ncbi-vdb",-0.6569361569,-0.2675890873,-0.7753516055,"https://salsa.debian.org/med-team/ncbi-vdb","https://github.com/ncbi/ncbi-vdb",3367.922349537,2,70,0,18,30,0,5,46,2,"2",1.97222222222222,1.65217391304348,-0.00961828891325519,1.2853691738343,1.10869565217391,1,0 +"ncompress",0.6360276236,1.8663344659,0.0985497423,"https://salsa.debian.org/debian/ncompress","https://github.com/vapier/ncompress.git",4740.1165856482,11,4,0,11,22,0,0,23,3,"3",1.26666666666667,1.95652173913043,0.934257056702382,1.39875721236047,1,1,0 +"ndctl",-0.3026771532,0.473161469,-0.4939488737,"https://github.com/kilobyte/ndctl/tree/debian","https://github.com/kilobyte/ndctl",3210.1365509259,74,5,0,51,3,0,0,54,2,"2",1.06329113924051,1.05555555555556,-0.118152577484063,1.02740233382816,1,1,1 +"ndg_httpsclient",0.1546655272,1.0783288299,-0.0773848973,"https://salsa.debian.org/debian/ndg-httpsclient","https://github.com/cedadev/ndg_httpsclient",3360.0136342593,2,11,0,6,22,0,0,22,2,"2",1.84615384615385,2,-0.0150583652301987,1.4142135623731,1,1,0 +"neard-deb",0.5311444679,4.0953604611,-0.5296646663,"https://github.com/sameo/neard-deb","https://github.com/sameo/neard-deb",1126.7503587963,0,4,0,2,2,0,0,2,1,"1",2,2,-1.55122729125062,1.4142135623731,1,0,0 +"neartree",-0.0269486668,2.399314564,-0.5366245779,"https://salsa.debian.org/science-team/neartree","https://github.com/yayahjb/neartree",4773.070625,0,3,0,2,2,0,0,3,3,"3",2,1.66666666666667,0.956924769817664,1.29099444873581,1,0,0 +"neko-debian",-0.3476116673,0.4024674223,-0.6520598063,"https://github.com/HaxeFoundation/neko-debian","https://github.com/HaxeFoundation/neko-debian",5577.6636111111,6,3,0,5,2,0,0,7,4,"4",1.33333333333333,1.28571428571429,1.51037082203092,1.13389341902768,1,0,0 +"neomutt",1.0660685693,2.7351403402,0.2935299788,"https://salsa.debian.org/mutt-team/neomutt","https://github.com/neomutt/neomutt",5650.5290625,268,117,0,322,9,0,0,326,4,"4",1.3038961038961,1.02760736196319,1.56049193557535,1.01370970300337,1,1,0 +"netconsole",-1.2200873308,0.812746843,-1.6449255455,"https://salsa.debian.org/debian/netconsole","https://github.com/ionos-cloud/netconsole",558.8093865741,0,1,0,1,2,0,0,2,1,"1",2,2,-1.94189026544057,1.4142135623731,1,1,0 +"nfoview",-0.0498945429,1.6663964244,-0.6736195708,"https://salsa.debian.org/python-team/packages/nfoview","https://github.com/otsaloma/nfoview",5657.3754861111,14,5,0,10,8,0,0,13,4,"4",1.26315789473684,1.61538461538462,1.56520130563543,1.27097781860449,1,1,0 +"nfstrace",0.7169141553,2.6489983997,-0.0935466194,"https://salsa.debian.org/debian/nfstrace","https://github.com/epam/nfstrace",2137.7810300926,9,42,0,16,32,0,0,38,1,"1",1.82352941176471,1.84210526315789,-0.855781341118764,1.35724178507659,1,1,0 +"nifti2dicom",-0.1186607259,1.299142347,-0.6903266138,"https://salsa.debian.org/med-team/nifti2dicom","https://github.com/biolab-unige/nifti2dicom.git",2963.0766898148,0,2,0,2,17,0,0,17,2,"2",2,2,-0.288094780750316,1.4142135623731,1,1,0 +"ninka",-1.2427926984,1.0338618531,-1.6842246523,"https://salsa.debian.org/debian/ninka","https://github.com/dmgerman/ninka",4166.3812268519,0,17,0,10,27,0,0,27,3,"3",2,2,0.539608364975998,1.4142135623731,1,1,0 +"nload",0.6920286572,1.9662038736,0.1248983732,"https://github.com/marciosouza20/nload.git","https://github.com/marciosouza20/nload.git",5.8634143519,0,1,0,1,0,0,0,1,1,"1",2,1,-2.3222388027709,1,1,0,0 +"nm-tray",0.2402419984,2.9899186351,-0.4509695416,"https://salsa.debian.org/lxqt-team/nm-tray","https://github.com/palinek/nm-tray.git",2973.3749074074,57,7,0,43,49,0,0,80,2,"2",1.109375,1.6125,-0.281011065170088,1.26984250992003,1,1,0 +"nocache",0.6323720855,2.8803006592,-0.068529056,"https://salsa.debian.org/debian/nocache","https://github.com/Feh/nocache",3331.9030902778,2,12,0,11,42,0,0,42,2,"2",1.85714285714286,2,-0.0343944393206832,1.4142135623731,1,1,0 +"nodau",-1.5991809833,-0.3805538345,-1.905798655,"https://salsa.debian.org/carnil/nodau","https://github.com/TicklishHoneyBee/nodau",4073.1802662037,2,7,0,3,6,0,0,6,3,"3",1.77777777777778,2,0.475499300363662,1.4142135623731,1,0,0 +"abbrev-js",0.3167225092,2.5424116289,-0.1165089261,"https://salsa.debian.org/js-team/node-abbrev","https://github.com/npm/abbrev-js",5021.0522106482,6,4,0,8,4,0,0,12,4,"4",1.4,1.33333333333333,1.12750098905857,1.15470053837925,1,1,1 +"node-active-x-obfuscator",-1.7102077451,0.4939822957,-2.1488227767,"https://salsa.debian.org/js-team/node-active-x-obfuscator","https://github.com/felixge/node-active-x-obfuscator.git",979.9255902778,0,5,0,3,0,0,0,3,1,"1",2,1,-1.65222194308874,1,1,0,0 +"address",-2.3512829732,-0.2296492891,-2.7851879565,"https://salsa.debian.org/js-team/node-address","https://github.com/node-modules/address.git",3756.5830208333,7,6,0,10,40,0,0,41,2,"2",1.46153846153846,1.97560975609756,0.257725222517492,1.40556385699745,1,1,0 +"ansi.js",0.651738311,3.3801423506,-0.0622958722,"https://salsa.debian.org/js-team/node-ansi","https://github.com/TooTallNate/ansi.js.git",2003.1949884259,2,6,0,6,9,0,0,13,1,"1",1.75,1.69230769230769,-0.948357481762823,1.30088727117598,1,1,0 +"applause",-2.6025031313,0.0354812349,-3.2768862018,"https://salsa.debian.org/js-team/node-applause","https://github.com/outatime/applause.git",2600.1592592593,1,6,0,4,30,0,0,30,1,"1",1.85714285714286,2,-0.537730587533979,1.4142135623731,1,1,0 +"node-cross-spawn-async",-0.4789307226,0.5287764974,-0.6568563161,"https://salsa.debian.org/js-team/node-cross-spawn-async","https://github.com/IndigoUnited/node-cross-spawn-async.git",674.7693981481,1,12,0,8,0,0,0,8,1,"1",1.92307692307692,1,-1.86212619624276,1,1,1,0 +"CSSStyleDeclaration",0.0239557668,3.7882296404,-1.1998721983,"https://salsa.debian.org/js-team/node-cssstyle","https://github.com/chad3814/CSSStyleDeclaration.git",2137.4537037037,0,9,0,5,0,0,0,5,1,"1",2,1,-0.85600649532822,1,1,1,0 +"d3-color",-0.5677058758,2.345342576,-1.264606113,"https://salsa.debian.org/js-team/node-d3-color","https://github.com/d3/d3-color",3047.9240046296,6,8,0,11,41,0,0,44,2,"2",1.57142857142857,1.93181818181818,-0.229731841679576,1.38989862285642,1,1,0 +"node-dashdash",0.812623388,3.8026107021,-0.0104465219,"https://salsa.debian.org/js-team/node-dashdash","https://github.com/trentm/node-dashdash",3657.7330671296,5,4,0,5,28,0,0,28,2,"2",1.44444444444444,2,0.189730450523268,1.4142135623731,1,1,0 +"node-deep-extend",0.3074384175,2.5963720517,-0.1256934881,"https://salsa.debian.org/js-team/node-deep-extend","https://github.com/unclechu/node-deep-extend.git",2469.0779513889,2,14,0,9,1,0,0,9,1,"1",1.875,1.11111111111111,-0.627895967561051,1.05409255338946,1,1,0 +"dryice",-1.6777851216,0.5009822025,-2.1440213388,"https://salsa.debian.org/js-team/node-dryice","https://github.com/mozilla/dryice",1261.6348842593,1,13,0,12,13,0,0,17,1,"1",1.92857142857143,1.76470588235294,-1.45844583601699,1.32842232831014,1,1,0 +"node-errno",0.7419951798,3.986012183,-0.0698570252,"https://salsa.debian.org/js-team/node-errno","https://github.com/rvagg/node-errno",3152.3664699074,3,11,0,11,31,0,0,31,2,"2",1.78571428571429,2,-0.157890213565461,1.4142135623731,1,1,0 +"node-error-ex",-0.1994307651,1.9233568792,-0.6268261848,"https://salsa.debian.org/js-team/node-error-ex","https://github.com/qix-/node-error-ex.git",1448.5513425926,4,8,0,5,25,0,0,25,1,"1",1.66666666666667,2,-1.32987377816417,1.4142135623731,1,1,0 +"node-extend",0.7004129328,3.6122581892,-0.0527431497,"https://salsa.debian.org/js-team/node-extend","https://github.com/justmoon/node-extend",4212.296400463,1,15,0,13,1,0,0,13,3,"3",1.9375,1.07692307692308,0.571191503296124,1.03774904332554,1,1,0 +"extend-shallow",-0.1006921362,1.3927484709,-0.3636715364,"https://salsa.debian.org/js-team/node-extend-shallow","https://github.com/jonschlinkert/extend-shallow",1170.6065046296,0,5,0,3,4,0,0,4,1,"1",2,2,-1.5210604725041,1.4142135623731,1,1,0 +"file-entry-cache",-0.7855336157,1.967354907,-1.5011474598,"https://salsa.debian.org/js-team/node-file-entry-cache","https://github.com/royriojas/file-entry-cache.git",3181.5545138889,1,11,0,7,28,0,0,28,2,"2",1.91666666666667,2,-0.137812972038082,1.4142135623731,1,1,0 +"node-findit",-0.2051260072,2.7355493581,-1.1209208962,"https://salsa.debian.org/js-team/node-findit2","https://github.com/andrewrk/node-findit.git",1811.4445601852,1,5,0,4,4,0,0,6,1,"1",1.83333333333333,1.66666666666667,-1.08025462647067,1.29099444873581,1,1,0 +"fined",-0.1637425394,2.1242452034,-0.5982871995,"https://salsa.debian.org/js-team/node-fined","https://github.com/js-cli/fined",1982.8433680556,5,3,0,4,10,0,0,10,1,"1",1.375,2,-0.96235651499393,1.4142135623731,1,1,0 +"node-form-data",0.5074076179,3.0343874901,-0.0886742861,"https://salsa.debian.org/js-team/node-form-data","https://github.com/felixge/node-form-data.git",3563.1111111111,9,36,0,35,5,0,0,36,2,"2",1.8,1.13888888888889,0.124643942294741,1.06718737290547,1,0,0 +"node-fresh",-0.3450557311,2.0039913503,-0.81124946,"https://salsa.debian.org/js-team/node-fresh","https://github.com/visionmedia/node-fresh.git",3886.7925231482,11,3,0,12,37,0,0,37,3,"3",1.21428571428571,2,0.347290923761231,1.4142135623731,1,1,0 +"is-npm",0.9785051776,4.5008052167,0.0095997285,"https://salsa.debian.org/js-team/node-is-npm","https://github.com/sindresorhus/is-npm",2619.0418634259,7,2,0,7,17,0,0,17,1,"1",1.22222222222222,2,-0.524742029453177,1.4142135623731,1,0,0 +"is-typedarray",0.3980978816,2.528720541,-0.0976776715,"https://salsa.debian.org/js-team/node-is-typedarray","https://github.com/hughsk/is-typedarray",349.2442476852,0,2,0,2,14,0,0,14,1,"1",2,2,-2.08604140869149,1.4142135623731,1,1,0 +"isexe",0.3099265646,2.6155667478,-0.1218258686,"https://salsa.debian.org/js-team/node-isexe","https://github.com/isaacs/isexe",2832.2716319445,1,4,0,1,26,0,0,26,2,"2",1.8,2,-0.378070139891526,1.4142135623731,1,1,0 +"Jed",0.9307464408,4.5334423493,-0.0663016053,"https://salsa.debian.org/js-team/node-jed","https://github.com/messageformat/Jed.git",1857.5029166667,3,19,0,18,61,0,0,61,1,"1",1.86363636363636,2,-1.04857299860896,1.4142135623731,1,1,0 +"jsesc",0.1478102512,3.2506359357,-0.5098361018,"https://salsa.debian.org/js-team/node-jsesc","https://github.com/mathiasbynens/jsesc",2702.1588310185,6,3,0,8,44,0,0,44,1,"1",1.33333333333333,2,-0.46756932427164,1.4142135623731,1,1,0 +"JSON.minify",-0.1691871793,2.0408856828,-0.6162694158,"https://salsa.debian.org/js-team/node-jsonminify","https://github.com/fkei/JSON.minify",3001.0353819445,2,9,0,8,17,0,0,18,2,"2",1.81818181818182,1.94444444444444,-0.261984575132068,1.39443337755679,1,1,0 +"JSONSelect",0.5601821689,4.3158830877,-0.4551619485,"https://salsa.debian.org/js-team/node-jsonselect","https://github.com/lloyd/JSONSelect",984.9768287037,2,8,0,8,38,0,0,39,1,"1",1.8,1.97435897435897,-1.64874740625601,1.40511884705849,1,1,0 +"knockout",-1.6817262176,0.9748888004,-2.3144504112,"https://salsa.debian.org/js-team/node-knockout","https://github.com/knockout/knockout.git",4081.7972685185,20,115,0,81,45,0,125,241,3,"3",1.85185185185185,1.18672199170124,0.481426577875847,1.08936770270705,1.51867219917012,1,0 +"lastfm-node",-0.2802502576,3.2316861272,-1.2092934746,"https://salsa.debian.org/js-team/node-lastfm","https://github.com/jammus/lastfm-node",4644.4506018519,2,11,2,9,28,0,0,28,3,"3",1.84615384615385,2,0.868452405186505,1.4142135623731,1,1,0 +"node-macaddress",-2.3578089542,0.3286344876,-2.9837856086,"https://salsa.debian.org/js-team/node-macaddress","https://github.com/scravy/node-macaddress",2961.7712268519,5,13,0,12,73,0,0,73,2,"2",1.72222222222222,2,-0.288992754428436,1.4142135623731,1,1,0 +"map-visit",0.0602654466,2.3400984295,-0.3823836028,"https://salsa.debian.org/js-team/node-map-visit","https://github.com/jonschlinkert/map-visit",645.0525115741,0,3,0,2,3,0,0,4,1,"1",2,1.75,-1.88256720659502,1.3228756555323,1,1,0 +"media-typer",-0.1314554385,2.3567183276,-0.7554351148,"https://salsa.debian.org/js-team/node-media-typer","https://github.com/expressjs/media-typer.git",2488.2450925926,1,1,0,2,14,0,0,14,1,"1",1.5,2,-0.614711688286291,1.4142135623731,1,1,0 +"merge-descriptors",-0.2368061411,2.2901222412,-0.8069774958,"https://salsa.debian.org/js-team/node-merge-descriptors","https://github.com/component/merge-descriptors.git",3669.9310532407,3,3,0,6,17,0,0,17,2,"2",1.5,2,0.198120937856212,1.4142135623731,1,0,0 +"node-mess",-0.2872327671,3.3046798368,-1.2179833072,"https://salsa.debian.org/js-team/node-mess","https://github.com/bobrik/node-mess",420.8625578704,0,3,0,2,2,0,0,2,1,"1",2,2,-2.03677815171262,1.4142135623731,1,1,0 +"minimist",0.3063916948,2.5263654362,-0.1223643827,"https://salsa.debian.org/js-team/node-minimist","https://github.com/minimistjs/minimist.git",3791.1307175926,12,9,0,15,32,0,0,43,3,"3",1.42857142857143,1.74418604651163,0.281489146283359,1.32067635948844,1,1,0 +"mixin-deep",0.2041015905,2.301231867,-0.3460970033,"https://salsa.debian.org/js-team/node-mixin-deep","https://github.com/jonschlinkert/mixin-deep.git",1736.2018171296,0,4,0,2,14,0,0,14,1,"1",2,2,-1.13201098008133,1.4142135623731,1,1,0 +"node-mocks-http",-1.7138454453,1.129012054,-2.4238704392,"https://salsa.debian.org/js-team/node-mocks-http","https://github.com/howardabrams/node-mocks-http",4315.2549074074,38,62,0,71,2,0,0,72,3,"3",1.62,1.02777777777778,0.642012378190355,1.0137937550497,1,1,1 +"repeat-element",0.0303018925,2.2050520215,-0.399164761,"https://salsa.debian.org/js-team/node-repeat-element","https://github.com/jonschlinkert/repeat-element",2277.9809027778,1,7,0,3,6,0,0,6,1,"1",1.875,2,-0.759343679595685,1.4142135623731,1,1,0 +"semver-diff",0.3257088663,2.53870067,-0.1250464411,"https://salsa.debian.org/js-team/node-semver-diff","https://github.com/sindresorhus/semver-diff",2556.954525463,4,3,0,6,11,0,0,11,1,"1",1.42857142857143,2,-0.567449327032393,1.4142135623731,1,0,0 +"node-simple-swizzle",-3.3828108141,-1.5319435267,-3.7510526278,"https://salsa.debian.org/js-team/node-simple-swizzle","https://github.com/qix-/node-simple-swizzle",2271.2482060185,1,3,0,1,3,0,0,3,1,"1",1.75,2,-0.7639748216843,1.4142135623731,1,1,0 +"snapdragon",0.0374783954,2.1244720905,-0.3853126603,"https://salsa.debian.org/js-team/node-snapdragon","https://github.com/jonschlinkert/snapdragon.git",2160.5059722222,3,7,0,4,43,0,0,43,1,"1",1.7,2,-0.840149798555621,1.4142135623731,1,1,0 +"ssri",0.4331740134,2.8578668337,-0.1107367526,"https://salsa.debian.org/js-team/node-ssri","https://github.com/zkat/ssri.git",2084.4809606482,2,3,0,2,27,0,0,27,1,"1",1.6,2,-0.892444242145622,1.4142135623731,1,1,1 +"starttls",-3.2028271629,0.3123776454,-4.1656333947,"https://salsa.debian.org/js-team/node-starttls","https://github.com/mattcg/starttls",960.3696643519,0,1,0,1,4,0,0,4,1,"1",2,2,-1.66567365120439,1.4142135623731,1,1,0 +"string_decoder",0.4324513521,3.0006538783,-0.1138855604,"https://salsa.debian.org/js-team/node-string-decoder","https://github.com/nodejs/string_decoder.git",2072.5483449074,4,7,0,8,9,0,0,12,1,"1",1.63636363636364,1.75,-0.900652192237561,1.3228756555323,1,1,0 +"test-commonjs",-1.1865527924,1.2057642216,-1.6221327583,"https://salsa.debian.org/js-team/node-test","https://github.com/Gozala/test-commonjs",826.1617476852,0,3,0,1,16,0,0,16,1,"1",2,2,-1.75798969538713,1.4142135623731,1,0,0 +"timed-out",0.534083437,2.8184506266,-0.0696353825,"https://salsa.debian.org/js-team/node-timed-out","https://github.com/floatdrop/timed-out",2343.4748726852,6,7,0,8,28,0,0,28,1,"1",1.53846153846154,2,-0.71429310158329,1.4142135623731,1,0,0 +"nodeenv",-0.6570648957,1.4812327857,-1.14641203,"https://github.com/chriskuehl/nodeenv","https://github.com/chriskuehl/nodeenv",2128.7291782408,1,53,0,38,2,0,0,40,1,"1",1.98148148148148,1.05,-0.862007733542108,1.02469507659596,1,0,0 +"nomnom",0.4452914343,2.9402706663,-0.3322295975,"https://github.com/mogaal/nomnom","https://github.com/mogaal/nomnom",917.9151273148,0,2,0,1,0,0,0,1,1,"1",2,1,-1.69487636155275,1,1,0,0 +"nordlicht",-0.4190840106,1.2017878417,-0.7274544195,"https://salsa.debian.org/multimedia-team/nordlicht","https://github.com/nordlicht/nordlicht",1854.1766087963,0,8,0,6,13,0,0,13,1,"1",2,2,-1.05086102745223,1.4142135623731,1,1,0 +"norm",0.0395894571,0.5725879857,-0.0372679262,"https://salsa.debian.org/debian/norm","https://github.com/USNavalResearchLaboratory/norm",1453.1532523148,10,9,0,11,11,0,1,19,1,"1",1.47368421052632,1.57894736842105,-1.32670831585918,1.25656172487509,1.05263157894737,0,0 +"notmuch-addrlookup-c",-0.5765143279,1.1877508137,-1.0148913081,"https://salsa.debian.org/debian/notmuch-addrlookup","https://github.com/aperezdc/notmuch-addrlookup-c",3177.0368287037,9,8,0,14,28,0,0,28,2,"2",1.47058823529412,2,-0.140920499786958,1.4142135623731,1,1,0 +"nsca-ng",-0.5633658512,0.8404353755,-1.1288671432,"https://salsa.debian.org/nagios-team/nsca-ng","https://github.com/weiss/nsca-ng.git",3817.9714236111,3,6,0,5,6,0,0,9,3,"3",1.66666666666667,1.66666666666667,0.299951751651515,1.29099444873581,1,1,0 +"nsnake.debian",0.294306693,3.1180145865,-0.512619257,"https://github.com/alexdantas/nsnake.debian","https://github.com/alexdantas/nsnake.debian",35.0934490741,0,2,0,0,1,0,0,1,1,"1",2,2,-2.30213267755938,1.4142135623731,1,0,0 +"nsntrace",-0.2107095266,2.4855302503,-1.1430329763,"https://salsa.debian.org/sudip/nsntrace","https://github.com/nsntrace/nsntrace",1665.640150463,1,7,0,6,21,0,0,21,1,"1",1.875,2,-1.18054741592943,1.4142135623731,1,1,0 +"nss-passwords",0.7982881531,3.7262660831,-0.2843886787,"https://salsa.debian.org/ocaml-team/nss-passwords","https://github.com/glondu/nss-passwords",4767.9518865741,1,2,0,2,4,0,0,5,3,"3",1.66666666666667,1.8,0.953403802542248,1.34164078649987,1,0,0 +"nulib2",-2.8835281311,-0.617225292,-3.3218622057,"https://salsa.debian.org/debian/nulib2","https://github.com/fadden/nulib2.git",2958.8671643519,0,7,0,4,9,0,0,9,2,"2",2,2,-0.29099033824255,1.4142135623731,1,0,0 +"nuntius-linux",0.0562256061,3.0068525021,-0.7578958074,"https://salsa.debian.org/debian/nuntius-linux","https://github.com/holylobster/nuntius-linux.git",1285.1505324074,2,13,0,13,70,0,0,71,1,"1",1.86666666666667,1.98591549295775,-1.4422703996691,1.40922513920159,1,1,0 +"nurpawiki",-4.202425836,-3.4681724303,-4.3504039812,"https://salsa.debian.org/ocaml-team/nurpawiki","https://github.com/glondu/nurpawiki.git",5643.4121296296,0,6,0,2,2,0,0,2,4,"4",2,2,1.55559649344625,1.4142135623731,1,0,0 +"nvidia-modprobe",0.5457409995,2.6334328552,-0.0334171669,"https://salsa.debian.org/nvidia-team/nvidia-modprobe","https://github.com/NVIDIA/nvidia-modprobe",3894.0040972222,0,3,0,3,7,0,0,9,3,"3",2,1.77777777777778,0.352251465638175,1.33333333333333,1,0,0 +"nvidia-persistenced",0.5544050718,2.8521283153,-0.0537008341,"https://salsa.debian.org/nvidia-team/nvidia-persistenced","https://github.com/NVIDIA/nvidia-persistenced",3871.0209606482,0,3,0,3,13,0,0,15,3,"3",2,1.86666666666667,0.336442321855007,1.36626010212795,1,0,0 +"nvidia-settings",0.3151479615,2.7684405123,-0.2288499596,"https://salsa.debian.org/nvidia-team/nvidia-settings","https://github.com/NVIDIA/nvidia-settings",5776.4649305556,24,5,0,16,143,0,0,150,4,"4",1.17241379310345,1.95333333333333,1.64711798155209,1.39761701954911,1,0,0 +"ocaml-ffmpeg",-1.7680324626,0.6213946308,-2.2379595426,"https://salsa.debian.org/ocaml-team/ocaml-ffmpeg","https://github.com/savonet/ocaml-ffmpeg.git",4033.3768634259,2,11,0,7,20,0,0,21,3,"3",1.84615384615385,1.95238095238095,0.448120195011896,1.39727626201154,1,1,0 +"ocaml-fileutils",-1.2078611318,0.0677154031,-1.4595756972,"https://salsa.debian.org/ocaml-team/ocaml-fileutils","https://github.com/gildor478/ocaml-fileutils.git",1144.3784027778,5,6,0,7,12,0,0,12,1,"1",1.54545454545455,2,-1.53910169294413,1.4142135623731,1,1,0 +"ocaml-flac",-1.7507623662,-0.3502245327,-2.1890215844,"https://salsa.debian.org/ocaml-team/ocaml-flac","https://github.com/savonet/ocaml-flac.git",4915.2796990741,1,7,0,5,12,0,0,14,3,"3",1.875,1.85714285714286,1.0547444774137,1.36277028773849,1,1,0 +"gen",-2.9140964642,-0.9922910043,-3.3171869681,"https://salsa.debian.org/ocaml-team/ocaml-gen","https://github.com/c-cube/gen.git",3422.9857291667,3,9,0,7,18,0,0,18,2,"2",1.75,2,0.028257519854197,1.4142135623731,1,0,0 +"ocaml-gstreamer",-0.175799754,2.6087723309,-0.9430825776,"https://salsa.debian.org/ocaml-team/ocaml-gstreamer","https://github.com/savonet/ocaml-gstreamer.git",5244.7535532407,0,10,0,5,5,0,0,7,4,"4",2,1.71428571428571,1.28137583891406,1.30930734141595,1,1,0 +"ocaml-http",-1.5494605128,1.5864107076,-2.4465473259,"https://salsa.debian.org/ocaml-team/ocaml-http","https://github.com/sacerdot/ocaml-http.git",3570.2121180556,1,3,0,2,0,0,0,2,2,"2",1.75,1,0.129528429641776,1,1,1,0 +"ocaml-inotify",-1.5984447381,0.206726916,-1.9785130273,"https://salsa.debian.org/ocaml-team/ocaml-inotify","https://github.com/whitequark/ocaml-inotify",3586.2803240741,4,14,0,12,18,0,0,19,2,"2",1.77777777777778,1.94736842105263,0.140581080287005,1.39548142984872,1,1,0 +"ocaml-ladspa",-0.7118657078,1.2358767302,-1.4392313232,"https://salsa.debian.org/ocaml-team/ocaml-ladspa","https://github.com/savonet/ocaml-ladspa.git",4935.8736458333,1,7,0,4,4,0,0,6,3,"3",1.875,1.66666666666667,1.06891019688941,1.29099444873581,1,1,0 +"ocaml-ogg",-0.348620776,1.64371205,-0.9603602503,"https://salsa.debian.org/ocaml-team/ocaml-ogg","https://github.com/savonet/ocaml-ogg.git",5318.8518402778,1,7,0,4,2,0,0,4,4,"4",1.875,1.5,1.33234496882738,1.22474487139159,1,1,0 +"ocaml-opus",-0.9457632068,1.3513638625,-1.5381035109,"https://salsa.debian.org/ocaml-team/ocaml-opus","https://github.com/savonet/ocaml-opus.git",3889.1978819445,2,8,0,5,6,0,0,7,3,"3",1.8,1.85714285714286,0.348945470038602,1.36277028773849,1,1,0 +"res",-1.6619256072,0.8404387726,-2.374669465,"https://salsa.debian.org/ocaml-team/ocaml-res","https://github.com/mmottl/res",3234.9244791667,0,3,0,2,6,0,0,6,2,"2",2,2,-0.101101992574387,1.4142135623731,1,0,0 +"ocaml-sha",-2.1615777656,-1.5624804098,-2.2474510973,"https://salsa.debian.org/ocaml-team/ocaml-sha","https://github.com/djs55/ocaml-sha.git",5351.1972453704,6,17,0,13,26,0,0,27,4,"4",1.73913043478261,1.96296296296296,1.35459402774879,1.40105780143539,1,1,0 +"ocaml-shine",-1.6537337701,1.6212733101,-2.5015175014,"https://salsa.debian.org/ocaml-team/ocaml-shine","https://github.com/savonet/ocaml-shine.git",3549.8277199074,1,5,0,4,3,0,0,5,2,"2",1.83333333333333,1.6,0.115506849940475,1.26491106406735,1,1,0 +"ocaml-speex",-0.6153846806,3.1543840863,-1.9637699192,"https://salsa.debian.org/ocaml-team/ocaml-speex","https://github.com/savonet/ocaml-speex.git",5316.9980902778,1,7,0,4,2,0,0,4,4,"4",1.875,1.5,1.33106985129964,1.22474487139159,1,1,0 +"ocaml-ssl",1.2627219166,4.0685720227,0.1401679649,"https://salsa.debian.org/ocaml-team/ocaml-ssl","https://github.com/savonet/ocaml-ssl.git",5405.4381828704,11,30,0,25,0,0,0,25,4,"4",1.73170731707317,1,1.3919041127805,1,1,1,0 +"ocaml-theora",-0.2512292534,3.1544360643,-1.4728171897,"https://salsa.debian.org/ocaml-team/ocaml-theora","https://github.com/savonet/ocaml-theora.git",5316.9970717593,1,8,0,4,1,0,0,4,4,"4",1.88888888888889,1.25,1.33106915070312,1.11803398874989,1,1,0 +"ocaml-usb",-0.5973686893,1.7793339383,-1.206091524,"https://salsa.debian.org/ocaml-team/ocaml-usb","https://github.com/letoh/ocaml-usb.git",4549.6073263889,1,8,0,5,8,0,0,10,3,"3",1.88888888888889,1.8,0.803213660516757,1.34164078649987,1,1,0 +"ocaml-vorbis",-0.9822001321,0.9986914273,-1.5520563192,"https://salsa.debian.org/ocaml-team/ocaml-vorbis","https://github.com/savonet/ocaml-vorbis.git",5459.5669675926,1,7,0,4,3,0,0,6,4,"4",1.875,1.5,1.42913705258078,1.22474487139159,1,1,0 +"ocamlagrep",-2.1652077496,-1.0121628969,-2.3572482465,"https://salsa.debian.org/ocaml-team/ocamlagrep","https://github.com/xavierleroy/ocamlagrep",2115.1310300926,1,2,0,2,4,0,0,4,1,"1",1.66666666666667,2,-0.87136133410779,1.4142135623731,1,1,0 +"gsl-ocaml",0.1216448812,1.0155865797,-0.2462866522,"https://salsa.debian.org/ocaml-team/ocamlgsl","https://github.com/mmottl/gsl-ocaml.git",3442.6045023148,1,11,0,10,21,0,0,22,2,"2",1.91666666666667,1.95454545454545,0.0417524579601875,1.39805059083906,1,1,0 +"ocaml-makefile",-0.4214445039,1.3411395826,-0.7864395598,"https://salsa.debian.org/ocaml-team/ocamlmakefile","https://github.com/mmottl/ocaml-makefile.git",1922.9826967593,0,4,0,2,8,0,0,8,1,"1",2,2,-1.00353218118001,1.4142135623731,1,1,0 +"ocl-icd",0.2781454411,0.8515664588,0.03306071,"https://salsa.debian.org/opencl-team/ocl-icd","https://github.com/OCL-DEV/ocl-icd.git",4207.2761689815,2,15,0,5,27,0,0,28,3,"3",1.88235294117647,1.96428571428571,0.567738294850868,1.40152977645347,1,0,0 +"octave-mpi",-0.032052781,2.1492331512,-0.6364834294,"https://salsa.debian.org/pkg-octave-team/octave-mpi","https://github.com/carlodefalco/octave-mpi",1390.161724537,1,3,0,1,6,0,0,6,1,"1",1.75,2,-1.37003756800692,1.4142135623731,1,1,0 +"odil",-0.8317789828,-0.397569442,-0.9351734244,"https://salsa.debian.org/med-team/odil","https://github.com/lamyj/odil",2678.1739351852,5,12,1,9,15,0,1,16,1,"1",1.70588235294118,1.9375,-0.484067536586224,1.39194109070751,1.0625,1,0 +"odt2txt",0.9552454239,3.2643599868,0.0923391006,"https://salsa.debian.org/debian/odt2txt","https://github.com/dstosberg/odt2txt",3417.1558564815,1,9,0,5,28,0,0,28,2,"2",1.9,2,0.0242473928978028,1.4142135623731,1,0,0 +"ofxstatement",-0.8387724027,1.4898616569,-1.2924218148,"https://github.com/gerasiov/ofxstatement","https://github.com/gerasiov/ofxstatement",1632.6686689815,1,16,0,11,3,0,0,13,1,"1",1.94117647058824,1.23076923076923,-1.20322712676032,1.10940039245046,1,0,0 +"ofxstatement-plugins",-0.5554916063,2.2730604682,-1.2542888677,"https://github.com/gerasiov/ofxstatement-plugins","https://github.com/gerasiov/ofxstatement-plugins",1689.0224305556,0,3,0,1,0,0,0,1,1,"1",2,1,-1.16446371792016,1,1,0,0 +"ogdi",0.4637866222,1.3827381608,0.0703190227,"https://salsa.debian.org/debian-gis-team/ogdi-dfsg","https://github.com/libogdi/ogdi.git",5366.5318402778,1,9,0,9,11,0,0,13,4,"4",1.9,1.84615384615385,1.3651420578215,1.35873244097351,1,0,0 +"onesixtyone",-0.0525705364,1.7993576972,-0.4404876155,"https://salsa.debian.org/pkg-security-team/onesixtyone","https://github.com/trailofbits/onesixtyone",3350.0547222222,10,11,0,15,26,0,0,27,2,"2",1.52380952380952,1.96296296296296,-0.0219086866304788,1.40105780143539,1,1,0 +"onionbalance",-1.7072197089,-0.2953383489,-2.1044905747,"https://salsa.debian.org/debian/onionbalance","https://github.com/asn-d6/onionbalance.git",3123.2153240741,16,8,0,18,1,0,0,19,2,"2",1.33333333333333,1.05263157894737,-0.177942074391284,1.02597835208515,1,0,0 +"Sensor",-0.705184402,0.5021820033,-0.967790767,"https://salsa.debian.org/multimedia-team/openni-sensor-primesense","https://github.com/PrimeSense/Sensor.git",1069.8803587963,0,3,0,3,28,0,1,31,1,"1",2,1.90322580645161,-1.59034579903366,1.37957450195762,1.03225806451613,0,0 +"opensysusers",-3.3096631827,-1.1081118835,-3.751144934,"https://salsa.debian.org/debian/opensysusers","https://github.com/cromerc/opensysusers.git",1929.9289236111,4,11,0,5,2,0,0,5,1,"1",1.73333333333333,1.4,-0.998754160621458,1.18321595661992,1,1,0 +"OpenMSX",0.5832066024,3.2825027954,-0.1430416611,"https://salsa.debian.org/openttd-team/openttd-openmsx","https://github.com/OpenTTD/OpenMSX.git",5037.8726041667,7,8,0,10,18,0,0,19,4,"4",1.53333333333333,1.94736842105263,1.13907103820165,1.39548142984872,1,0,0 +"OpenSFX",0.0341113683,1.8104216829,-0.3723043838,"https://salsa.debian.org/openttd-team/openttd-opensfx","https://github.com/OpenTTD/OpenSFX.git",5073.9709953704,7,9,0,10,14,0,0,15,4,"4",1.5625,1.93333333333333,1.16390162018261,1.39044357430761,1,1,0 +"opentyrian",-0.4709020515,1.8128682506,-0.9006361349,"https://salsa.debian.org/games-team/opentyrian","https://github.com/opentyrian/opentyrian.git",5445.2196527778,6,17,0,14,49,0,1,54,4,"4",1.73913043478261,1.90740740740741,1.4192681314229,1.38108921051734,1.01851851851852,0,0 +"platform",0.4510883183,2.2604153125,-0.0788317433,"https://salsa.debian.org/debian/p8-platform","https://github.com/Pulse-Eight/platform.git",2947.3549768519,2,28,0,23,43,0,0,48,2,"2",1.93333333333333,1.89583333333333,-0.298909093233206,1.37689263682153,1,1,0 +"pacemaker",1.1235155799,1.8849677755,0.6240113585,"https://salsa.debian.org/ha-team/pacemaker","https://github.com/ClusterLabs/pacemaker",5780.1951388889,21,156,0,106,3,0,0,107,4,"4",1.88135593220339,1.02803738317757,1.64968383672562,1.01392178356004,1,0,1 +"packit",1.4894283431,3.9572075631,0.3794626915,"https://salsa.debian.org/debian/packit","https://github.com/resurrecting-open-source-projects/packit",2522.8474189815,3,11,0,6,11,0,0,11,1,"1",1.78571428571429,2,-0.590910187070262,1.4142135623731,1,1,1 +"pacman4console.debian",0.7320531649,3.0292005631,-0.1602141611,"https://github.com/alexdantas/pacman4console.debian","https://github.com/alexdantas/pacman4console.debian",442.2178819444,0,2,0,2,1,0,0,3,1,"1",2,1.33333333333333,-2.02208871244766,1.15470053837925,1,1,0 +"padthv1",-0.0637358518,2.799184112,-0.6752002578,"https://salsa.debian.org/multimedia-team/padthv1","https://github.com/rncbc/padthv1.git",2334.0719907407,2,4,0,3,6,0,0,6,1,"1",1.66666666666667,2,-0.7207609530081,1.4142135623731,1,0,0 +"pajeng",-2.2918945291,-1.4246521723,-2.5749097918,"https://salsa.debian.org/debian/pajeng","https://github.com/schnorr/pajeng.git",3890.9853472222,1,24,0,10,19,0,5,24,3,"3",1.96,1.79166666666667,0.35017499306265,1.33853153368408,1.20833333333333,0,0 +"pam_p11",-0.5485831615,0.9644461867,-1.1064659619,"https://salsa.debian.org/opensc-team/pam-p11","https://github.com/OpenSC/pam_p11.git",5663.1348842593,3,10,0,11,24,0,0,25,4,"4",1.76923076923077,1.96,1.56916295608885,1.4,1,0,0 +"ParaFly",-0.7037850797,1.1831572633,-1.0930849211,"https://salsa.debian.org/med-team/parafly","https://github.com/ParaFly/ParaFly",1437.0966666667,1,4,0,2,1,0,0,3,1,"1",1.8,1.33333333333333,-1.3377529733349,1.15470053837925,1,1,0 +"parallax",-0.0887932063,2.3891626891,-0.651790374,"https://salsa.debian.org/python-team/packages/parallax","https://github.com/krig/parallax",5166.3950231482,4,10,0,8,6,0,0,9,4,"4",1.71428571428571,1.66666666666667,1.22747626498595,1.29099444873581,1,1,0 +"partd",0.2096153056,2.6193211803,-0.3193732736,"https://salsa.debian.org/python-team/packages/partd","https://github.com/dask/partd.git",3130.7778009259,14,10,0,21,46,0,0,46,2,"2",1.41666666666667,2,-0.1727401610875,1.4142135623731,1,0,1 +"pass-extension-tail",-0.3578050897,2.1366716684,-0.9333806276,"https://salsa.debian.org/debian/pass-extension-tail","https://github.com/palortoff/pass-extension-tail",1892.8072222222,4,2,0,5,18,0,0,18,1,"1",1.33333333333333,2,-1.02428863511946,1.4142135623731,1,1,0 +"pastedeploy",0.1590091885,1.1475071601,-0.1727660592,"https://salsa.debian.org/python-team/packages/pastedeploy","https://github.com/Pylons/pastedeploy",4320.1172453704,5,24,0,21,22,0,0,33,3,"3",1.82758620689655,1.66666666666667,0.645356978251009,1.29099444873581,1,0,0 +"pastescript",0.3538232706,1.3551325439,-0.0943410822,"https://salsa.debian.org/python-team/packages/pastescript","https://github.com/cdent/pastescript.git",3347.9577893519,0,24,0,14,7,0,0,18,2,"2",2,1.38888888888889,-0.0233510795407539,1.17851130197758,1,0,0 +"libdir",-0.0254803142,1.5396086069,-0.4343390486,"https://salsa.debian.org/multimedia-team/pd/pd-libdir","https://github.com/pure-data/libdir",2709.9478356482,1,9,0,3,1,0,0,3,1,"1",1.9,1.33333333333333,-0.462211591930703,1.15470053837925,1,0,0 +"pd-lua",-0.3693835135,1.759056146,-0.7808199336,"https://salsa.debian.org/multimedia-team/pd/pd-lua","https://github.com/agraef/pd-lua.git",3302.6912962963,1,8,0,6,12,0,0,12,2,"2",1.88888888888889,2,-0.0544880174853028,1.4142135623731,1,0,0 +"moonlib",-0.2205765237,2.0226305482,-0.7345172583,"https://salsa.debian.org/multimedia-team/pd/pd-moonlib","https://github.com/MetaluNet/moonlib.git",5328.8024537037,1,11,0,4,15,0,0,15,4,"4",1.91666666666667,2,1.33918958195816,1.4142135623731,1,0,0 +"PuRestJson",-0.254922487,2.320237042,-0.8198404593,"https://salsa.debian.org/multimedia-team/pd/pd-purest-json","https://github.com/residuum/PuRestJson.git",4472.3532291667,0,8,0,5,24,0,2,26,3,"3",2,1.92307692307692,0.750073780026894,1.38675049056307,1.07692307692308,1,0 +"tclpd",-0.5472322751,1.0653891207,-0.8320989326,"https://salsa.debian.org/multimedia-team/pd/pd-tclpd","https://github.com/pd-externals/tclpd.git",5367.8831018519,2,12,0,3,0,0,0,3,4,"4",1.85714285714286,1,1.36607153445951,1,1,0,0 +"vbap",-0.2128975248,1.7544581087,-0.7432504363,"https://salsa.debian.org/multimedia-team/pd/pd-vbap","https://github.com/pd-externals/vbap.git",5156.0736574074,1,7,0,2,5,0,0,5,4,"4",1.875,2,1.22037662675731,1.4142135623731,1,0,0 +"xsample",-0.3812603066,1.9525555214,-0.8681596425,"https://salsa.debian.org/multimedia-team/pd/pd-xsample","https://github.com/grrrr/xsample.git",5672.9809259259,1,13,0,6,6,0,0,9,4,"4",1.92857142857143,1.66666666666667,1.57593563865553,1.29099444873581,1,0,0 +"pdd",-0.9684689619,1.3033133236,-1.4106955016,"https://salsa.debian.org/debian/pdd","https://github.com/jarun/pdd.git",2233.8472337963,8,9,0,11,23,0,0,23,1,"1",1.52941176470588,2,-0.789701394973688,1.4142135623731,1,1,0 +"pdfresurrect",-0.2399652539,1.6794626137,-0.5968823707,"https://salsa.debian.org/debian/pdfresurrect","https://github.com/enferex/pdfresurrect.git",5171.962662037,2,6,0,6,19,0,0,19,4,"4",1.75,2,1.23130601222008,1.4142135623731,1,0,0 +"pkg-pdudaemon",-2.9130668064,-0.1458508245,-3.6790610276,"https://github.com/pdudaemon/pkg-pdudaemon","https://github.com/pdudaemon/pkg-pdudaemon",1898.0415972222,9,22,0,16,6,0,0,19,1,"1",1.70967741935484,1.31578947368421,-1.02068812625403,1.14707866935281,1,1,0 +"peony-extensions",-0.5641116061,1.8659191557,-1.1878043816,"https://github.com/ukui/peony-extensions","https://github.com/ukui/peony-extensions",1664.9383333333,13,33,0,17,25,0,0,31,1,"1",1.71739130434783,1.80645161290323,-1.18103016674446,1.34404301006449,1,1,0 +"pgcharts",-0.3307169052,2.7252468866,-1.42193945,"https://github.com/dimitri/pgcharts","https://github.com/dimitri/pgcharts",2256.897962963,2,6,0,6,31,0,0,31,1,"1",1.75,2,-0.77384575705717,1.4142135623731,1,1,0 +"pgextwlist",-2.6334021475,-0.1576929626,-3.2620922871,"https://github.com/dimitri/pgextwlist","https://github.com/dimitri/pgextwlist",4298.9919444445,2,19,0,12,42,0,0,42,3,"3",1.9047619047619,2,0.630825762342992,1.4142135623731,1,1,0 +"pgl_ddl_deploy",-2.518566076,0.3310770855,-3.2597707489,"https://salsa.debian.org/postgresql/pgl-ddl-deploy","https://github.com/enova/pgl_ddl_deploy.git",2403.2563425926,9,12,0,10,14,0,0,17,1,"1",1.57142857142857,1.82352941176471,-0.673171914738656,1.350381209794,1,1,0 +"pglogical_ticker",-1.9930028095,1.9160778986,-3.1056655448,"https://salsa.debian.org/postgresql/pglogical-ticker","https://github.com/enova/pglogical_ticker.git",1787.9691666667,1,7,0,5,4,0,0,5,1,"1",1.875,1.8,-1.09640237333305,1.34164078649987,1,1,0 +"pgpdump",0.3614395033,1.5189339773,-0.144183693,"https://salsa.debian.org/debian/pgpdump","https://github.com/kazu-yamamoto/pgpdump.git",4538.9134143519,4,16,0,16,27,0,0,28,3,"3",1.8,1.96428571428571,0.795857763185114,1.40152977645347,1,1,0 +"pgqd",-1.087235167,1.0595056838,-1.531425517,"https://salsa.debian.org/postgresql/pgqd","https://github.com/pgq/pgqd",2225.1037384259,0,1,0,1,6,0,0,6,1,"1",2,2,-0.795715681797989,1.4142135623731,1,0,0 +"pgsphere",-0.619432589,1.6193404032,-1.0673571695,"https://salsa.debian.org/postgresql/pgsphere","https://github.com/akorotkov/pgsphere",1961.9147569445,2,10,0,7,24,0,0,26,1,"1",1.83333333333333,1.92307692307692,-0.976752436158654,1.38675049056307,1,0,0 +"pgsql-asn1oid",-2.1322683467,0.0065837251,-2.973862338,"https://github.com/df7cb/pgsql-asn1oid","https://github.com/df7cb/pgsql-asn1oid",2425.8964351852,3,4,0,5,4,0,0,5,1,"1",1.57142857142857,1.8,-0.657598736643132,1.34164078649987,1,1,0 +"pgxnclient",-0.8515588813,0.3709704299,-1.1014910489,"https://salsa.debian.org/postgresql/pgxnclient","https://github.com/pgxn/pgxnclient.git",3780.2494212963,0,7,0,7,26,0,1,27,3,"3",2,1.96296296296296,0.274004355113034,1.40105780143539,1.03703703703704,0,0 +"pgzero",-0.0710203462,2.371473236,-0.5273222344,"https://github.com/RPi-Distro/pgzero","https://github.com/RPi-Distro/pgzero",1071.605775463,0,31,0,19,0,0,0,19,1,"1",2,1,-1.58915895666852,1,1,0,0 +"Auth_SASL",0.4421914964,2.6769992169,-0.103972592,"https://salsa.debian.org/php-team/pear/php-auth-sasl","https://github.com/pear/Auth_SASL.git",5614.3564699074,3,10,0,7,4,0,0,8,4,"4",1.76923076923077,1.5,1.53561031354499,1.22474487139159,1,1,0 +"ansel",-1.6222799231,-0.0808757241,-1.9210437163,"https://salsa.debian.org/horde-team/php-horde-ansel","https://github.com/horde/ansel.git",3572.8158912037,8,17,0,12,3,0,0,13,2,"2",1.68,1.23076923076923,0.131319456899719,1.10940039245046,1,0,0 +"Auth",0.2047852084,2.9463639076,-0.5544067681,"https://salsa.debian.org/horde-team/php-horde-auth","https://github.com/horde/Auth.git",5222.153275463,8,22,0,12,3,0,0,13,4,"4",1.73333333333333,1.23076923076923,1.26583004777381,1.10940039245046,1,0,0 +"Cache",-0.1744700522,2.1064596197,-0.6213237314,"https://salsa.debian.org/horde-team/php-horde-cache","https://github.com/horde/Cache.git",5348.4683796296,2,18,0,8,2,0,0,9,4,"4",1.9,1.22222222222222,1.35271695449892,1.10554159678513,1,0,0 +"Compress",-0.0162442716,2.57315541,-0.6076939055,"https://salsa.debian.org/horde-team/php-horde-compress","https://github.com/horde/Compress.git",5217.754375,1,13,0,8,5,0,0,9,4,"4",1.92857142857143,1.55555555555556,1.26280422709509,1.24721912892465,1,0,0 +"Core",-0.3802607961,0.3526269848,-0.6046153747,"https://salsa.debian.org/horde-team/php-horde-core","https://github.com/horde/Core.git",5226.4980671296,21,34,0,20,9,0,0,25,4,"4",1.61818181818182,1.36,1.26881864926186,1.16619037896906,1,0,0 +"Crypt",0.1875117087,2.6751835929,-0.5329652206,"https://salsa.debian.org/horde-team/php-horde-crypt","https://github.com/horde/Crypt.git",5471.7365162037,3,21,0,13,6,0,0,16,4,"4",1.875,1.375,1.43750797894019,1.17260393995586,1,0,0 +"Css_Parser",-0.0402081222,2.5291557096,-0.6027329405,"https://salsa.debian.org/horde-team/php-horde-css-parser","https://github.com/horde/Css_Parser.git",3874.0563888889,2,10,0,6,4,0,0,7,3,"3",1.83333333333333,1.57142857142857,0.338530266698663,1.25356634105602,1,0,0 +"Data",0.183171821,3.0993813097,-0.5706552519,"https://salsa.debian.org/horde-team/php-horde-data","https://github.com/horde/Data.git",5055.5932638889,0,13,0,7,3,0,0,9,4,"4",2,1.33333333333333,1.15126034302429,1.15470053837925,1,0,0 +"Dav",-0.3866587637,0.750534239,-0.6284871625,"https://salsa.debian.org/horde-team/php-horde-dav","https://github.com/horde/Dav.git",3872.1194328704,2,9,0,7,2,0,0,8,3,"3",1.81818181818182,1.25,0.337197915211321,1.11803398874989,1,0,0 +"Db",-0.2646821748,1.3792981818,-0.615400448,"https://salsa.debian.org/horde-team/php-horde-db","https://github.com/horde/Db.git",5458.1645833333,6,19,0,14,13,0,0,23,4,"4",1.76,1.56521739130435,1.42817241077381,1.25108648434245,1,0,0 +"Editor",-0.2234265847,1.3429870434,-0.6059411864,"https://salsa.debian.org/horde-team/php-horde-editor","https://github.com/horde/Editor.git",5432.4430208333,0,10,0,4,0,0,0,4,4,"4",2,1,1.41047961768698,1,1,0,0 +"Form",0.1425278965,2.5646449602,-0.5503801228,"https://salsa.debian.org/horde-team/php-horde-form","https://github.com/horde/Form.git",5422.4999189815,3,17,0,11,2,0,0,13,4,"4",1.85,1.15384615384615,1.40364017145562,1.07417231105915,1,0,0 +"gollem",-0.1716189866,2.8981752591,-0.8667773936,"https://salsa.debian.org/horde-team/php-horde-gollem","https://github.com/horde/gollem.git",3924.770474537,2,13,0,7,0,0,0,7,3,"3",1.86666666666667,1,0.373414377022824,1,1,0,0 +"groupware",-0.8795755727,1.9558886765,-1.5950928322,"https://salsa.debian.org/horde-team/php-horde-groupware","https://github.com/horde/groupware.git",2932.5787731482,1,6,0,5,0,0,0,5,2,"2",1.85714285714286,1,-0.309073029220317,1,1,0,0 +"Icalendar",0.411178925,3.9130953916,-0.5130418157,"https://salsa.debian.org/horde-team/php-horde-icalendar","https://github.com/horde/Icalendar.git",5159.3724305556,2,18,0,9,3,0,0,10,4,"4",1.9,1.3,1.22264571561035,1.14017542509914,1,0,0 +"Image",0.8616256223,3.8466113515,-0.1929764669,"https://salsa.debian.org/horde-team/php-horde-image","https://github.com/horde/Image.git",5265.7997569445,5,20,0,14,5,0,0,15,4,"4",1.8,1.33333333333333,1.29585264713264,1.15470053837925,1,0,0 +"Imap_Client",0.0159896159,2.4567285756,-0.5941860898,"https://salsa.debian.org/horde-team/php-horde-imap-client","https://github.com/horde/Imap_Client.git",5506.4812615741,14,23,0,22,21,0,0,34,4,"4",1.62162162162162,1.61764705882353,1.4614074442504,1.27186754767292,1,0,0 +"imp",-0.3872646541,1.289223631,-0.8571466277,"https://salsa.debian.org/horde-team/php-horde-imp","https://github.com/horde/imp.git",5305.9052546296,15,26,0,24,15,0,0,29,4,"4",1.63414634146341,1.51724137931034,1.32343955100704,1.23176352410288,1,0,0 +"ingo",-0.7382910403,0.4431034944,-0.9475741714,"https://salsa.debian.org/horde-team/php-horde-ingo","https://github.com/horde/ingo.git",4403.5670833333,10,21,0,17,4,0,0,19,3,"3",1.67741935483871,1.21052631578947,0.702758651116233,1.10023920844036,1,0,0 +"JavascriptMinify_Jsmin",-1.3153334642,2.2921605757,-2.4364015778,"https://salsa.debian.org/horde-team/php-horde-javascriptminify-jsmin","https://github.com/horde/JavascriptMinify_Jsmin.git",3603.5893634259,2,12,0,6,1,0,0,7,2,"2",1.85714285714286,1.14285714285714,0.152487248576092,1.0690449676497,1,0,0 +"kronolith",-0.1662532613,1.8723658314,-0.7951139086,"https://salsa.debian.org/horde-team/php-horde-kronolith","https://github.com/horde/kronolith.git",4413.8611458333,19,29,0,22,6,0,0,24,3,"3",1.60416666666667,1.25,0.709839508581071,1.11803398874989,1,0,0 +"ListHeaders",0.4960376568,4.1898452532,-0.5036453419,"https://salsa.debian.org/horde-team/php-horde-listheaders","https://github.com/horde/ListHeaders.git",4255.5799305556,2,10,0,6,1,0,0,7,3,"3",1.83333333333333,1.14285714285714,0.600964443489634,1.0690449676497,1,0,0 +"Mail",-0.3639164444,1.1332103907,-0.6269982172,"https://salsa.debian.org/horde-team/php-horde-mail","https://github.com/horde/Mail.git",4915.3072685185,7,13,0,11,9,0,0,17,3,"3",1.65,1.52941176470588,1.0547634412879,1.23669388480168,1,0,0 +"Mapi",-0.0661710252,2.5876798045,-0.6185327392,"https://salsa.debian.org/horde-team/php-horde-mapi","https://github.com/horde/Mapi.git",2259.7966087963,1,5,0,5,3,0,0,6,1,"1",1.83333333333333,1.5,-0.7718518991428,1.22474487139159,1,0,0 +"Memcache",0.004016163,2.7221166702,-0.6028996022,"https://salsa.debian.org/horde-team/php-horde-memcache","https://github.com/horde/Memcache.git",4490.5543634259,3,7,0,6,1,0,0,7,3,"3",1.7,1.14285714285714,0.762593583300654,1.0690449676497,1,0,0 +"Mime",0.312598092,3.6199038108,-0.5392920252,"https://salsa.debian.org/horde-team/php-horde-mime","https://github.com/horde/Mime.git",5432.603287037,7,18,0,12,8,0,0,15,4,"4",1.72,1.53333333333333,1.41058985814305,1.23827837473378,1,0,0 +"Mime_Viewer",-0.1149494509,1.9424076317,-0.6016432814,"https://salsa.debian.org/horde-team/php-horde-mime-viewer","https://github.com/horde/Mime_Viewer.git",4839.7695138889,2,13,0,7,0,0,0,7,3,"3",1.86666666666667,1,1.00280416148499,1,1,0,0 +"mnemo",-0.6207827443,0.9747903027,-0.8920648669,"https://salsa.debian.org/horde-team/php-horde-mnemo","https://github.com/horde/mnemo.git",4989.4455671296,5,17,0,11,4,0,0,12,4,"4",1.77272727272727,1.33333333333333,1.1057600934989,1.15470053837925,1,1,0 +"Mongo",0.9167713268,5.4298937243,-0.4793837277,"https://salsa.debian.org/horde-team/php-horde-mongo","https://github.com/horde/Mongo.git",3839.6499652778,0,8,0,5,0,0,0,5,3,"3",2,1,0.314863518855908,1,1,0,0 +"Pack",0.2142725625,3.1945332925,-0.549560368,"https://salsa.debian.org/horde-team/php-horde-pack","https://github.com/horde/Pack.git",3648.4273842593,1,11,0,5,0,0,0,5,2,"2",1.91666666666667,1,0.183329458299102,1,1,0,0 +"passwd",-0.9612115226,1.4732179071,-1.6779013899,"https://salsa.debian.org/horde-team/php-horde-passwd","https://github.com/horde/passwd.git",4947.6389583333,4,19,0,12,5,0,0,13,3,"3",1.82608695652174,1.38461538461538,1.07700306604013,1.1766968108291,1,0,0 +"Role",-0.4479418321,1.1729020603,-0.7670302689,"https://salsa.debian.org/horde-team/php-horde-role","https://github.com/horde/Role.git",4810.1311111111,0,8,0,5,0,0,0,5,3,"3",2,1,0.982417136872005,1,1,0,0 +"sesha",-1.1621564014,1.5450444492,-1.9921994089,"https://salsa.debian.org/horde-team/php-horde-sesha","https://github.com/horde/sesha.git",2802.3719791667,3,8,0,7,1,0,0,8,2,"2",1.72727272727273,1.125,-0.39863686751415,1.06066017177982,1,0,0 +"Test",-0.238823004,1.8788404924,-0.6415143522,"https://salsa.debian.org/horde-team/php-horde-test","https://github.com/horde/Test.git",5359.615,2,15,0,7,3,0,0,8,4,"4",1.88235294117647,1.375,1.36038425106502,1.17260393995586,1,0,0 +"Text_Filter",-0.1437145474,1.0768696744,-0.5555850141,"https://salsa.debian.org/horde-team/php-horde-text-filter","https://github.com/horde/Text_Filter.git",5251.3064930556,3,17,0,9,6,0,0,13,4,"4",1.85,1.46153846153846,1.28588333367669,1.20894104965398,1,0,0 +"Text_Filter_Jsmin",-1.3124045178,2.1222615389,-2.421955358,"https://salsa.debian.org/horde-team/php-horde-text-filter-jsmin","https://github.com/horde/Text_Filter_Jsmin.git",2314.7323726852,0,4,0,5,1,0,0,6,1,"1",2,1.16666666666667,-0.73406387193592,1.08012344973464,1,0,0 +"trean",-0.3058682727,1.9780246873,-0.8789295788,"https://salsa.debian.org/horde-team/php-horde-trean","https://github.com/horde/trean.git",3562.8353472222,2,9,0,7,2,0,0,7,2,"2",1.81818181818182,1.28571428571429,0.124454255784556,1.13389341902768,1,0,0 +"turba",-0.4579650553,1.3117889624,-0.8859304773,"https://salsa.debian.org/horde-team/php-horde-turba","https://github.com/horde/turba.git",4857.3907407407,15,22,0,21,16,0,0,32,3,"3",1.59459459459459,1.5,1.01492507057148,1.22474487139159,1,0,0 +"webmail",-0.4053353634,1.7962363637,-1.0122255509,"https://salsa.debian.org/horde-team/php-horde-webmail","https://github.com/horde/webmail.git",2950.8800810185,2,6,0,6,2,0,0,6,2,"2",1.75,1.33333333333333,-0.296484320685691,1.15470053837925,1,0,0 +"whups",-1.0654230845,1.9993317897,-1.8956270843,"https://salsa.debian.org/horde-team/php-horde-whups","https://github.com/horde/whups.git",3431.4867013889,4,18,0,11,0,0,0,11,2,"2",1.81818181818182,1,0.0341049850913618,1,1,0,0 +"wicked",-1.0749433837,1.994516371,-1.8921752454,"https://salsa.debian.org/horde-team/php-horde-wicked","https://github.com/horde/wicked.git",4893.9981712963,5,14,0,9,5,0,0,11,3,"3",1.73684210526316,1.45454545454545,1.04010579955172,1.20604537831105,1,0,0 +"php-invoker",-0.2905127861,1.9595946138,-0.8899334149,"https://salsa.debian.org/php-team/pear/php-invoker","https://github.com/sebastianbergmann/php-invoker",4657.8966203704,2,7,0,5,14,0,0,14,3,"3",1.77777777777778,2,0.877701362106971,1.4142135623731,1,1,0 +"Mail_Mime",0.0757330813,0.6687496969,-0.1249911134,"https://salsa.debian.org/php-team/pear/php-mail-mime","https://github.com/pear/Mail_Mime.git",5740.767650463,4,21,0,21,26,0,0,35,4,"4",1.84,1.74285714285714,1.62256330722229,1.32017314881691,1,0,0 +"Net_LDAP2",0.6398853183,2.49018646,-0.0984745451,"https://salsa.debian.org/php-team/pear/php-net-ldap2","https://github.com/pear/Net_LDAP2.git",3594.4854166667,3,10,0,6,8,0,0,9,2,"2",1.76923076923077,1.88888888888889,0.146225022232569,1.37436854187255,1,0,0 +"Net_Sieve",0.5286086799,2.5513325545,-0.1071035548,"https://salsa.debian.org/php-team/pear/php-net-sieve","https://github.com/pear/Net_Sieve.git",4982.018912037,1,17,0,14,13,0,0,17,3,"3",1.94444444444444,1.76470588235294,1.10065160633446,1.32842232831014,1,0,0 +"Net_SMTP",0.6124793985,2.4835695922,0.0048970818,"https://salsa.debian.org/php-team/pear/php-net-smtp","https://github.com/pear/Net_SMTP.git",5742.5019097222,6,20,0,18,56,0,0,58,4,"4",1.76923076923077,1.96551724137931,1.62375623203904,1.40196905863835,1,0,0 +"Net_Socket",0.9079949967,3.0405813906,0.1178195629,"https://salsa.debian.org/php-team/pear/php-net-socket","https://github.com/pear/Net_Socket.git",3345.4632523148,1,15,0,13,12,0,0,15,2,"2",1.9375,1.8,-0.0250669678210579,1.34164078649987,1,0,0 +"manifest",0.0385459705,2.4455307258,-0.417874197,"https://salsa.debian.org/php-team/pear/php-phar-io-manifest","https://github.com/phar-io/manifest.git",2379.9058680556,3,9,0,9,17,0,0,18,1,"1",1.75,1.94444444444444,-0.689233735029026,1.39443337755679,1,1,0 +"ReflectionCommon",0.0165590904,2.2866863971,-0.4124357108,"https://salsa.debian.org/php-team/pear/php-phpdocumentor-reflection-common","https://github.com/phpDocumentor/ReflectionCommon",2836.5084606482,10,9,0,12,17,0,0,17,2,"2",1.47368421052632,2,-0.375155801635484,1.4142135623731,1,1,0 +"proxy-manager-lts",-0.4696575625,1.7442933083,-0.9000807342,"https://salsa.debian.org/php-team/pear/php-proxy-manager","https://github.com/FriendsOfPHP/proxy-manager-lts.git",3717.8990509259,21,47,0,55,26,0,0,78,2,"2",1.69117647058824,1.33333333333333,0.231116128480187,1.15470053837925,1,1,0 +"cache",0.9447656661,4.1692291038,-0.0612099304,"https://salsa.debian.org/php-team/pear/php-psr-cache","https://github.com/php-fig/cache.git",2530.1591435185,8,10,0,14,1,0,0,15,1,"1",1.55555555555556,1.06666666666667,-0.585880755855068,1.03279555898864,1,1,0 +"http-message",-0.068042639,3.3445895377,-1.0312499156,"https://salsa.debian.org/php-team/pear/php-psr-http-message","https://github.com/php-fig/http-message",3219.4525347222,3,24,0,21,3,0,0,22,2,"2",1.88888888888889,1.13636363636364,-0.111744499681315,1.06600358177805,1,1,0 +"Base",-0.0522904132,2.7525381131,-0.9743381106,"https://salsa.debian.org/php-team/pear/php-zeta-base","https://github.com/zetacomponents/Base.git",5395.1748726852,0,15,0,9,11,0,0,15,4,"4",2,1.73333333333333,1.38484440855403,1.31656117720877,1,0,0 +"ConsoleTools",-0.0924800072,2.7387441567,-0.9975723832,"https://salsa.debian.org/php-team/pear/php-zeta-console-tools","https://github.com/zetacomponents/ConsoleTools",5321.8501851852,2,14,0,12,14,0,0,17,4,"4",1.875,1.82352941176471,1.33440740558835,1.350381209794,1,0,0 +"motranslator",0.3875308077,2.8677316161,-0.26542951,"https://salsa.debian.org/phpmyadmin-team/motranslator","https://github.com/phpmyadmin/motranslator",2762.9628356482,6,14,2,15,27,0,0,27,2,"2",1.7,2,-0.425744778318642,1.4142135623731,1,1,1 +"global-state",0.247922925,2.3733235469,-0.3166378665,"https://salsa.debian.org/php-team/pear/phpunit-global-state","https://github.com/sebastianbergmann/global-state",3396.3039351852,9,7,0,12,28,0,0,28,2,"2",1.4375,2,0.00990422346715929,1.4142135623731,1,1,0 +"object-enumerator",0.2543254206,2.979551806,-0.3372246914,"https://salsa.debian.org/php-team/pear/phpunit-object-enumerator","https://github.com/sebastianbergmann/object-enumerator",2872.2632523148,6,4,0,8,11,0,0,11,2,"2",1.4,2,-0.350561567485828,1.4142135623731,1,1,0 +"pkg-pick",0.1551657364,3.388789847,-0.7551152625,"https://github.com/eavgerinos/pkg-pick","https://github.com/eavgerinos/pkg-pick",1591.7380671296,0,2,0,1,0,0,0,1,1,"1",2,1,-1.23138158547508,1,1,1,1 +"pickleshare",0.3717500472,2.4243139962,-0.0927808249,"https://salsa.debian.org/python-team/packages/pickleshare","https://github.com/pickleshare/pickleshare",3583.9321875,1,14,0,11,33,0,0,33,2,"2",1.93333333333333,2,0.13896589479642,1.4142135623731,1,1,0 +"picocom",0.7162187737,2.5722054768,0.0257322882,"https://salsa.debian.org/debian/picocom","https://github.com/npat-efault/picocom",2876.49875,2,13,0,11,34,0,0,35,2,"2",1.86666666666667,1.97142857142857,-0.347648144782055,1.40407570003493,1,1,0 +"plexus-interactivity",0.2831519667,2.3330540176,-0.1739153338,"https://salsa.debian.org/java-team/plexus-interactivity-api","https://github.com/codehaus-plexus/plexus-interactivity.git",2997.8996759259,5,11,0,10,10,0,0,12,2,"2",1.6875,1.83333333333333,-0.264141496888599,1.35400640077266,1,1,0 +"plotnetcfg",-1.0220271784,1.3223739863,-1.4560802079,"https://salsa.debian.org/debian/plotnetcfg","https://github.com/jbenc/plotnetcfg.git",2530.945150463,2,3,0,3,11,0,0,13,1,"1",1.6,1.84615384615385,-0.585340094367887,1.35873244097351,1,0,0 +"pmailq",-0.3444018612,2.2693637638,-1.1367799542,"https://salsa.debian.org/kolter/pmailq","https://github.com/k0lter/pmailq",3215.8993634259,0,2,0,1,0,0,0,1,2,"2",2,1,-0.114188578440042,1,1,1,0 +"pmemkv",-2.5666563504,-0.1874336633,-3.0132308585,"https://github.com/kilobyte/pmemkv/tree/debian","https://github.com/kilobyte/pmemkv",2071.5010185185,11,29,0,21,1,0,0,22,1,"1",1.725,1.04545454545455,-0.901372604502297,1.02247471629109,1,1,1 +"pnscan",0.0474645485,1.175913765,-0.3376962015,"https://salsa.debian.org/pkg-security-team/pnscan","https://github.com/ptrrkssn/pnscan",1864.9276967593,1,4,0,2,6,0,0,6,1,"1",1.8,2,-1.04346580117904,1.4142135623731,1,0,0 +"podcastparser",0.1102473664,2.4024478231,-0.3412380946,"https://salsa.debian.org/debian/podcastparser","https://github.com/gpodder/podcastparser.git",3885.4088657408,6,16,0,18,26,0,0,26,3,"3",1.72727272727273,2,0.346339163376838,1.4142135623731,1,1,0 +"podget",0.0442858046,1.2592098163,-0.4584578402,"https://salsa.debian.org/debian/podget","https://github.com/dvehrs/podget.git",2945.994837963,1,10,0,8,35,0,1,38,2,"2",1.90909090909091,1.92105263157895,-0.299844676206856,1.38602042971197,1.02631578947368,1,0 +"policyd-rate-limit",-1.5483891938,0.8603109839,-1.9855824959,"https://salsa.debian.org/python-team/packages/policyd-rate-limit","https://github.com/nitmir/policyd-rate-limit.git",2604.4654513889,1,4,0,4,24,0,0,24,1,"1",1.8,2,-0.534768537062078,1.4142135623731,1,0,0 +"pps-tools",0.7472487963,4.4814305955,-0.4374778463,"https://github.com/bzed/pps-tools","https://github.com/bzed/pps-tools",3767.0434143519,3,10,0,5,2,0,0,7,2,"2",1.76923076923077,1.28571428571429,0.264920492172338,1.13389341902768,1,0,0 +"prads",0.259994197,3.8326314267,-1.0339454478,"https://salsa.debian.org/debian/prads","https://github.com/gamelinux/prads.git",4237.0082638889,2,39,0,11,30,0,2,33,3,"3",1.95121951219512,1.90909090909091,0.588189766383156,1.38169855941551,1.06060606060606,0,0 +"prefix",-1.1387443889,1.4705314302,-2.0097706447,"https://github.com/dimitri/prefix","https://github.com/dimitri/prefix",5681.2066782408,1,10,0,7,23,0,0,23,4,"4",1.90909090909091,2,1.58159379156483,1.4142135623731,1,0,0 +"preggy",-2.9228555263,-1.0464425405,-3.3186736503,"https://salsa.debian.org/python-team/packages/preggy","https://github.com/heynemann/preggy",3206.0471759259,1,12,2,8,14,0,0,16,2,"2",1.92307692307692,1.875,-0.120965488469912,1.36930639376292,1,1,0 +"preprepare",-2.2210905897,-0.5977303937,-2.5998570115,"https://github.com/dimitri/preprepare","https://github.com/dimitri/preprepare",5242.6337615741,0,4,0,2,5,0,0,5,4,"4",2,2,1.2799177223885,1.4142135623731,1,0,0 +"primus_vk",-0.4212908417,2.921882742,-1.2334752443,"https://salsa.debian.org/nvidia-team/primus-vk","https://github.com/felixdoerre/primus_vk",1911.529537037,4,7,0,9,59,0,0,61,1,"1",1.63636363636364,1.9672131147541,-1.01141033341735,1.40257374663655,1,1,0 +"princeprocessor",-1.2692837532,1.0737092479,-1.7210172993,"https://salsa.debian.org/pkg-security-team/princeprocessor","https://github.com/hashcat/princeprocessor.git",3216.9043981482,0,10,0,6,22,0,0,22,2,"2",2,2,-0.113497256853854,1.4142135623731,1,1,0 +"proftpd-mod_case",-1.4646475873,0.7662724504,-2.0254092437,"https://salsa.debian.org/debian-proftpd-team/proftpd-mod-case","https://github.com/Castaglia/proftpd-mod_case.git",4180.9304050926,0,4,0,1,5,0,0,5,3,"3",2,2,0.549616139589076,1.4142135623731,1,1,0 +"mod_clamav",-0.5199500157,1.6804203805,-1.2969019371,"https://salsa.debian.org/debian-proftpd-team/proftpd-mod-clamav","https://github.com/jbenden/mod_clamav.git",3704.0200810185,2,4,0,5,16,0,0,17,2,"2",1.66666666666667,1.94117647058824,0.221569362305697,1.39326109203847,1,1,0 +"proftpd-mod_counter",-3.9091957799,-1.6311020735,-4.3444753088,"https://salsa.debian.org/debian-proftpd-team/proftpd-mod-counter","https://github.com/Castaglia/proftpd-mod_counter",4182.156412037,0,3,0,1,3,0,0,3,3,"3",2,2,0.550459458776636,1.4142135623731,1,1,0 +"proftpd-mod_msg",-1.7610775956,0.1821621492,-2.2899965266,"https://salsa.debian.org/debian-proftpd-team/proftpd-mod-msg","https://github.com/Castaglia/proftpd-mod_msg",1530.1719212963,0,2,0,1,1,0,0,1,1,"1",2,2,-1.27373037666466,1.4142135623731,1,1,0 +"proftpd-mod_tar",-1.0180464333,1.4128864786,-1.7353120048,"https://salsa.debian.org/debian-proftpd-team/proftpd-mod-tar","https://github.com/Castaglia/proftpd-mod_tar.git",4180.9053935185,0,2,0,1,3,0,0,3,3,"3",2,2,0.549598935167481,1.4142135623731,1,1,0 +"proftpd-mod_vroot",1.5988542337,4.0231527893,0.5685130663,"https://salsa.debian.org/debian-proftpd-team/proftpd-mod-vroot","https://github.com/Castaglia/proftpd-mod_vroot.git",3875.2868518519,0,5,0,3,23,0,0,23,3,"3",2,2,0.339376650996093,1.4142135623731,1,1,0 +"bind_exporter",-1.219120384,0.70031567,-1.6696173791,"https://salsa.debian.org/go-team/packages/prometheus-bind-exporter","https://github.com/prometheus-community/bind_exporter",2946.8200115741,21,14,0,25,30,0,1,51,2,"2",1.4,1.58823529411765,-0.299277073598658,1.26025207562521,1.01960784313725,1,0 +"mailexporter",-1.4619262945,0.8353265582,-1.9708877275,"https://salsa.debian.org/go-team/packages/prometheus-mailexporter","https://github.com/cherti/mailexporter",2367.3820486111,4,4,1,6,16,0,0,16,1,"1",1.5,2,-0.697848349560644,1.4142135623731,1,1,0 +"pspg",-0.3610506999,2.0130078842,-0.820706513,"https://salsa.debian.org/postgresql/pspg","https://github.com/okbob/pspg",2316.4040509259,13,25,0,29,14,0,0,39,1,"1",1.65789473684211,1.35897435897436,-0.732913993999054,1.16575055606865,1,1,0 +"Psychtoolbox-3",0.2033527556,1.6529232576,-0.3714926285,"https://github.com/neurodebian/Psychtoolbox-3/tree/debian","https://github.com/neurodebian/Psychtoolbox-3",5782.8479166667,14,56,0,38,2,0,0,39,4,"4",1.8,1.05128205128205,1.65150857223023,1.02532046272473,1,0,0 +"pt2-clone",-0.3668249418,2.0442471334,-0.8709375553,"https://salsa.debian.org/multimedia-team/pt2-clone","https://github.com/8bitbubsy/pt2-clone",1458.0896180556,2,4,0,4,7,0,0,10,1,"1",1.66666666666667,1.7,-1.32331279516899,1.30384048104053,1,1,0 +"PTable",-0.4977567219,1.9029777422,-1.0355607788,"https://salsa.debian.org/python-team/packages/ptable","https://github.com/kxxoling/PTable",3352.2971990741,2,16,0,9,45,0,0,45,2,"2",1.88888888888889,2,-0.0203661800684191,1.4142135623731,1,0,0 +"printer-driver-ptouch",2.9461393952,6.8234280435,1.5185561181,"https://salsa.debian.org/printing-team/ptouch-driver","https://github.com/philpem/printer-driver-ptouch.git",1342.5621990741,5,13,0,9,42,0,1,45,1,"1",1.72222222222222,1.93333333333333,-1.40277930191389,1.39044357430761,1.02222222222222,0,1 +"puppetlabs-mysql",-1.0852269476,0.911414697,-1.5945594785,"https://salsa.debian.org/puppet-team/puppet-module-puppetlabs-mysql","https://github.com/puppetlabs/puppetlabs-mysql",4577.2790046296,89,362,0,277,0,0,0,277,3,"3",1.80266075388027,1,0.822247857116523,1,1,1,1 +"puppetlabs-xinetd",-1.728520912,0.7618236366,-2.2296657543,"https://salsa.debian.org/puppet-team/puppet-module-puppetlabs-xinetd","https://github.com/puppetlabs/puppetlabs-xinetd",4771.0705671296,11,67,0,44,13,0,0,53,3,"3",1.85897435897436,1.24528301886792,0.955549013190799,1.1159224968016,1,1,1 +"purl",-1.3403902917,0.9095061718,-1.8075410282,"https://salsa.debian.org/python-team/packages/purl","https://github.com/codeinthehole/purl",3937.9855092593,4,18,0,13,36,0,0,36,3,"3",1.81818181818182,2,0.382504449796474,1.4142135623731,1,0,0 +"pwgen",1.3539562516,2.2914753933,0.7855817259,"https://github.com/tytso/pwgen","https://github.com/tytso/pwgen",1771.0365509259,6,3,0,5,16,0,0,18,1,"1",1.33333333333333,1.88888888888889,-1.10804961547555,1.37436854187255,1,0,0 +"project--perl-webget",-0.4530628758,1.9572713675,-1.0628915119,"https://salsa.debian.org/debian/pwget","https://github.com/jaalto/project--perl-webget",3883.3964236111,0,1,0,1,0,0,0,1,3,"3",2,1,0.344954888133062,1,1,0,0 +"pydl",-0.4956083654,0.3240229847,-0.642218824,"https://salsa.debian.org/debian-astro-team/pydl","https://github.com/weaverba137/pydl",4774.0527777778,1,11,1,10,23,0,0,26,3,"3",1.91666666666667,1.88461538461538,0.957600351865888,1.37281294596729,1,0,0 +"pyepr",-0.9391839973,0.1389487685,-1.21878767,"https://salsa.debian.org/debian-gis-team/pyepr","https://github.com/avalentino/pyepr.git",4620.4665856482,0,3,0,1,7,0,0,7,3,"3",2,2,0.851954797932539,1.4142135623731,1,0,0 +"pyfribidi",-1.3111437363,-0.4469862862,-1.5898484292,"https://salsa.debian.org/python-team/packages/pyfribidi","https://github.com/pediapress/pyfribidi.git",2842.4984953704,1,5,0,3,14,0,0,14,2,"2",1.83333333333333,2,-0.371035505874958,1.4142135623731,1,1,0 +"PyGnuplot",-0.3092811424,1.9971008368,-0.816765548,"https://salsa.debian.org/python-team/packages/pygnuplot","https://github.com/benschneider/PyGnuplot",2586.3193055556,0,7,0,3,14,0,0,14,1,"1",2,2,-0.547250516084623,1.4142135623731,1,0,0 +"PyGreSQL",0.6546350335,1.713004741,0.0882104427,"https://salsa.debian.org/debian/pygresql","https://github.com/PyGreSQL/PyGreSQL",5390.1054513889,4,4,4,8,32,0,0,36,4,"4",1.5,1.88888888888889,1.38135736448097,1.37436854187255,1,0,0 +"pygtail",-0.539020119,3.1329292561,-1.6179088283,"https://salsa.debian.org/python-team/packages/pygtail","https://github.com/bgreenlee/pygtail",4147.3947800926,7,19,0,17,74,0,0,75,3,"3",1.73076923076923,1.98666666666667,0.526548377894479,1.4094916341244,1,1,0 +"pygtkspellcheck",0.7257355054,2.6166114148,0.0292934832,"https://salsa.debian.org/python-team/packages/pygtkspellcheck","https://github.com/koehlma/pygtkspellcheck",4478.3301851852,2,11,1,6,23,0,0,23,3,"3",1.84615384615385,2,0.754185079491086,1.4142135623731,1,1,0 +"python-pass",-0.8847004821,1.9218976351,-1.6206835515,"https://salsa.debian.org/python-team/packages/pypass","https://github.com/ReAzem/python-pass.git",1834.5500810185,3,11,0,9,16,0,1,17,1,"1",1.78571428571429,1.94117647058824,-1.06436129964548,1.39326109203847,1.05882352941176,0,0 +"pypdf",0.3363136294,1.8784846763,-0.1155181855,"https://salsa.debian.org/debian/pypdf","https://github.com/py-pdf/pypdf",4367.5921759259,137,91,3,200,0,0,0,200,3,"3",1.39912280701754,1,0.67801300850307,1,1,1,1 +"python-pypeg2-debian",0.0855915399,2.2545524529,-0.3458051782,"https://github.com/fiete201/python-pypeg2-debian","https://github.com/fiete201/python-pypeg2-debian",825.4394097222,0,2,0,1,1,0,0,2,1,"1",2,1.5,-1.75848656162992,1.22474487139159,1,0,0 +"Pyphen",-0.5188951039,1.8020010624,-0.9777786823,"https://salsa.debian.org/python-team/packages/pyphen","https://github.com/Kozea/Pyphen",3769.9223263889,0,13,0,5,56,0,0,57,3,"3",2,1.98245614035088,0.266900776028959,1.40799720892865,1,0,0 +"pyqso",-0.3070953036,2.5075014452,-0.9777672312,"https://salsa.debian.org/debian-hamradio-team/pyqso","https://github.com/ctjacobs/pyqso",2213.7885648148,2,9,5,5,25,0,0,25,1,"1",1.81818181818182,2,-0.803498919128256,1.4142135623731,1,1,0 +"PyQwt3D",-0.3970590115,0.7440597483,-0.9451413135,"https://salsa.debian.org/python-team/packages/pyqwt3d","https://github.com/GauiStori/PyQwt3D",1540.4164930556,0,3,0,1,1,0,0,2,1,"1",2,1.5,-1.26668356182204,1.22474487139159,1,1,0 +"pyRFC3339",0.2375193564,1.6166813486,-0.0819212234,"https://salsa.debian.org/python-team/packages/pyrfc3339","https://github.com/kurtraschke/pyRFC3339",3552.2014583333,1,7,0,7,14,0,0,14,2,"2",1.875,2,0.117139645880135,1.4142135623731,1,0,0 +"pysmi",0.2393270185,2.2118303467,-0.1841478946,"https://salsa.debian.org/python-team/packages/pysmi","https://github.com/etingof/pysmi",1806.3306018519,5,7,0,9,59,0,0,60,1,"1",1.58333333333333,1.98333333333333,-1.08377230571919,1.40830867828517,1,1,0 +"pytest-runner",0.4615736429,3.294817871,-0.4721455985,"https://salsa.debian.org/python-team/packages/pytest-runner","https://github.com/pytest-dev/pytest-runner.git",4387.1189699074,16,10,0,24,56,0,0,67,3,"3",1.38461538461538,1.83582089552239,0.69144467796576,1.35492468260136,1,0,0 +"pytest-tornado",-1.6610342646,0.2346703329,-2.0594120368,"https://salsa.debian.org/python-team/packages/pytest-tornado","https://github.com/eugeniy/pytest-tornado",2043.2375578704,2,15,0,12,44,0,0,44,1,"1",1.88235294117647,2,-0.920813863607949,1.4142135623731,1,0,0 +"activipy",-2.4231132595,-0.8156429792,-2.7787913771,"https://salsa.debian.org/python-team/packages/python-activipy","https://github.com/w3c-social/activipy",294.9819907407,0,1,0,1,9,0,0,9,1,"1",2,2,-2.12336615848239,1.4142135623731,1,0,0 +"python-admesh",-0.1275889532,1.1910011407,-0.48238652,"https://salsa.debian.org/science-team/python-admesh","https://github.com/admesh/python-admesh",1607.8702662037,1,1,0,2,9,0,0,9,1,"1",1.5,2,-1.22028491666836,1.4142135623731,1,1,0 +"alignlib",-4.6393972307,-1.9112598753,-5.3987487651,"https://salsa.debian.org/med-team/python-alignlib","https://github.com/marcelm/alignlib.git",1738.8239930556,1,3,0,2,2,0,0,2,1,"1",1.75,2,-1.13020729431784,1.4142135623731,1,1,0 +"altgraph",-0.1776641612,2.0796554317,-0.6175630942,"https://salsa.debian.org/python-team/packages/python-altgraph","https://github.com/ronaldoussoren/altgraph",5013.4008912037,1,6,0,4,5,0,0,7,4,"4",1.85714285714286,1.71428571428571,1.12223796463022,1.30930734141595,1,0,0 +"arpy",-0.7545902864,2.54869808,-1.7298420281,"https://salsa.debian.org/python-team/packages/python-arpy","https://github.com/viraptor/arpy.git",4328.1231134259,1,9,0,8,14,0,0,17,3,"3",1.9,1.82352941176471,0.650863881923227,1.350381209794,1,1,0 +"asttokens",0.3340810363,3.0114183655,-0.2887013264,"https://salsa.debian.org/python-team/packages/python-asttokens","https://github.com/gristlabs/asttokens.git",2518.9855439815,9,8,0,14,30,0,0,33,1,"1",1.47058823529412,1.90909090909091,-0.593566610267812,1.38169855941551,1,0,0 +"python-caja",0.0214160855,0.7395995669,-0.2085070184,"https://salsa.debian.org/debian-mate-team/python-caja","https://github.com/mate-desktop/python-caja.git",4326.7211342593,10,21,0,18,39,0,0,45,3,"3",1.67741935483871,1.86666666666667,0.649899518762681,1.36626010212795,1,1,0 +"python-driver",-0.8062754247,1.604168392,-1.7480948985,"https://salsa.debian.org/python-team/packages/python-cassandra-driver","https://github.com/datastax/python-driver.git",3941.7978935185,43,186,0,129,3,0,0,130,3,"3",1.81222707423581,1.02307692307692,0.385126830371741,1.01147265068163,1,0,0 +"changelog",-1.7044805447,-0.290367733,-2.0502430594,"https://salsa.debian.org/python-team/packages/python-changelog","https://github.com/sqlalchemyorg/changelog",3951.4740509259,6,7,0,5,7,0,0,8,3,"3",1.53846153846154,1.875,0.391782656621984,1.36930639376292,1,0,0 +"cheroot",0.2184766626,2.5790389703,-0.2566344453,"https://salsa.debian.org/python-team/packages/python-cheroot","https://github.com/cherrypy/cheroot.git",5771.2991898148,32,151,0,116,6,0,0,117,4,"4",1.82513661202186,1.05128205128205,1.64356468333907,1.02532046272473,1,0,0 +"click-plugins",0.1835966503,2.5094374551,-0.2993391913,"https://salsa.debian.org/debian-gis-team/python-click-plugins/","https://github.com/click-contrib/click-plugins.git",1359.2907638889,1,8,0,5,25,0,0,25,1,"1",1.88888888888889,2,-1.39127241791693,1.4142135623731,1,0,0 +"cligj",0.0110381728,2.5995508465,-0.499940708,"https://salsa.debian.org/debian-gis-team/python-cligj","https://github.com/mapbox/cligj.git",2777.8914699074,2,10,0,5,17,0,0,18,2,"2",1.83333333333333,1.94444444444444,-0.415475991691972,1.39443337755679,1,0,0 +"python-debianbts",0.5135384712,1.0251605893,0.2314442315,"https://github.com/venthur/python-debianbts","https://github.com/venthur/python-debianbts",5257.8413310185,2,16,0,12,20,0,0,22,4,"4",1.88888888888889,1.90909090909091,1.29037837692819,1.38169855941551,1,1,0 +"deeptools_intervals",-2.8771627651,-0.6096159473,-3.3226496791,"https://salsa.debian.org/med-team/python-deeptoolsintervals","https://github.com/deeptools/deeptools_intervals",1246.0450694445,0,4,0,1,4,0,0,4,1,"1",2,2,-1.46916942124943,1.4142135623731,1,1,0 +"demjson",-0.2370389615,1.8179175852,-0.8013751143,"https://salsa.debian.org/python-team/packages/python-demjson","https://github.com/dmeranda/demjson",1291.8414699074,0,1,0,1,3,0,2,5,1,"1",2,1.6,-1.43766798203819,1.26491106406735,1.4,1,0 +"deprecated",0.1196653299,2.2597788252,-0.3084855603,"https://salsa.debian.org/debian-gis-team/python-deprecated","https://github.com/tantale/deprecated.git",2057.2850694445,18,4,0,17,55,0,0,55,1,"1",1.18181818181818,2,-0.911151164630565,1.4142135623731,1,1,0 +"diaspy",-2.1745867988,0.053506734,-2.6165608868,"https://salsa.debian.org/python-team/packages/python-diaspy","https://github.com/marekjm/diaspy",3779.1691319445,4,18,0,10,31,0,0,31,3,"3",1.81818181818182,2,0.273261268997045,1.4142135623731,1,1,0 +"diff-match-patch",0.5846033815,3.0986556298,-0.1184020196,"https://salsa.debian.org/debian/python-diff-match-patch","https://github.com/diff-match-patch-python/diff-match-patch",1729.8804282407,3,2,0,3,3,0,0,5,1,"1",1.4,1.6,-1.13635920059214,1.26491106406735,1,1,0 +"django-contact-form",-1.1097333705,0.6281218172,-1.6435972974,"https://salsa.debian.org/python-team/packages/python-django-contact-form","https://github.com/ubernostrum/django-contact-form",5539.2370717593,2,14,0,13,45,0,0,45,4,"4",1.875,2,1.48393880376631,1.4142135623731,1,0,0 +"django-etcd-settings",-0.9896632674,2.2575790822,-1.9919766953,"https://salsa.debian.org/python-team/packages/python-django-etcd-settings","https://github.com/kpn-digital/django-etcd-settings",2402.9784375,6,17,0,10,16,0,0,17,1,"1",1.73913043478261,1.94117647058824,-0.673363074093814,1.39326109203847,1,0,0 +"django-gravatar",-0.663578474,1.1679046767,-1.1279388031,"https://salsa.debian.org/python-team/packages/python-django-gravatar2","https://github.com/twaddington/django-gravatar",3121.6933101852,1,16,0,12,30,0,0,30,2,"2",1.94117647058824,2,-0.178989004445071,1.4142135623731,1,0,0 +"django-jsonfield",-1.0714207355,-0.0546197296,-1.3093579612,"https://salsa.debian.org/python-team/modules/python-django-jsonfield","https://github.com/adamchainz/django-jsonfield",3841.3997222222,3,25,0,23,14,0,0,33,3,"3",1.89285714285714,1.42424242424242,0.316067103885765,1.19341628287971,1,0,0 +"django-libsass",-4.8173196894,-2.3911675188,-5.4384155483,"https://salsa.debian.org/python-team/packages/python-django-libsass","https://github.com/torchbox/django-libsass.git",3571.0059490741,10,9,0,14,47,0,1,52,2,"2",1.47368421052632,1.90384615384615,0.130074472984058,1.3797993165117,1.01923076923077,0,0 +"python-ecdsa",0.1427395231,1.7301290558,-0.1550589722,"https://salsa.debian.org/python-team/packages/python-ecdsa","https://github.com/warner/python-ecdsa.git",4921.8631134259,21,34,0,44,13,0,0,51,3,"3",1.61818181818182,1.25490196078431,1.05927293434284,1.12022406722241,1,1,0 +"python-epc",-0.6679338747,1.8418923245,-1.2097561588,"https://salsa.debian.org/python-team/packages/python-epc","https://github.com/tkf/python-epc",2413.0286574074,1,4,0,3,7,0,0,7,1,"1",1.8,2,-0.666449945807038,1.4142135623731,1,0,0 +"esmre",-2.0064156677,0.202087282,-2.4755780824,"https://salsa.debian.org/debian/python-esmre","https://github.com/wharris/esmre.git",5681.6213078704,0,3,0,1,15,0,0,15,4,"4",2,2,1.58187899804263,1.4142135623731,1,1,0 +"python-fastimport",0.1052775184,1.7457116755,-0.2624270625,"https://salsa.debian.org/python-team/packages/python-fastimport","https://github.com/jelmer/python-fastimport",5680.5950578704,13,39,0,27,14,0,0,34,4,"4",1.75,1.41176470588235,1.58117308334925,1.18817705157201,1,1,0 +"fisx",-0.0903144328,1.779732029,-0.5983249377,"https://salsa.debian.org/python-team/packages/python-fisx","https://github.com/vasole/fisx",3592.9752777778,0,12,0,5,12,0,1,13,2,"2",2,1.92307692307692,0.145186260497403,1.38675049056307,1.07692307692308,0,0 +"python-frozendict",0.1906884697,2.6355499741,-0.3237980302,"https://salsa.debian.org/openstack-team/python/python-frozendict","https://github.com/slezica/python-frozendict.git",1398.6479861111,1,9,0,6,48,0,0,48,1,"1",1.9,2,-1.36420022161276,1.4142135623731,1,0,0 +"hiredis-py",-0.3124185118,1.2752110833,-0.6377697773,"https://salsa.debian.org/python-team/packages/python-hiredis","https://github.com/redis/hiredis-py.git",4704.1113541667,26,23,0,38,10,0,0,46,3,"3",1.46938775510204,1.21739130434783,0.90949055541982,1.10335456873474,1,1,0 +"python-hl7",-0.7626378243,0.9988106393,-1.372928154,"https://salsa.debian.org/med-team/python-hl7","https://github.com/johnpaulett/python-hl7.git",5098.8429398148,5,6,0,7,54,0,0,54,4,"4",1.54545454545455,2,1.18100999634452,1.4142135623731,1,0,0 +"hupper",-0.4811484079,1.3299311475,-0.8419038999,"https://salsa.debian.org/python-team/packages/python-hupper","https://github.com/Pylons/hupper",2605.9951273148,4,15,0,12,35,0,0,38,1,"1",1.78947368421053,1.92105263157895,-0.533716336611702,1.38602042971197,1,0,0 +"imagesize_py",0.7812671799,3.7438976125,-0.0426186257,"https://salsa.debian.org/python-team/packages/python-imagesize","https://github.com/shibukawa/imagesize_py",2343.1267013889,9,9,0,15,45,0,0,45,1,"1",1.5,2,-0.714532594137609,1.4142135623731,1,0,0 +"python-Levenshtein",0.4783401273,1.9718349997,-0.0580315974,"https://salsa.debian.org/python-team/packages/python-levenshtein","https://github.com/maxbachmann/python-Levenshtein",378.9515509259,1,2,0,1,9,0,0,9,1,"1",1.66666666666667,2,-2.06560699031564,1.4142135623731,1,1,0 +"python-libdiscid",0.0391061082,1.6124132852,-0.2458440286,"https://salsa.debian.org/multimedia-team/python-libdiscid","https://github.com/sebastinas/python-libdiscid.git",3900.1796643519,3,5,0,6,8,0,0,8,3,"3",1.625,2,0.356499381425547,1.4142135623731,1,1,0 +"python-librtmp-debian",0.1316033854,2.9370114855,-0.6388179337,"https://github.com/breunigs/python-librtmp-debian","https://github.com/breunigs/python-librtmp-debian",409.9315625,0,1,0,1,0,0,0,1,1,"1",2,1,-2.04429712880904,1,1,0,0 +"lti",-1.9083591935,0.6995479122,-2.570199413,"https://salsa.debian.org/python-team/packages/python-lti","https://github.com/pylti/lti.git",2862.783125,11,19,0,21,32,0,0,42,2,"2",1.63333333333333,1.76190476190476,-0.357082552788241,1.32736760616822,1,0,0 +"macholib",-0.2065761669,2.1953061241,-0.6422011034,"https://salsa.debian.org/python-team/packages/python-macholib","https://github.com/ronaldoussoren/macholib",5321.569525463,1,18,0,12,8,0,0,17,4,"4",1.94736842105263,1.47058823529412,1.33421435143806,1.21267812518166,1,0,0 +"py-magcode-core",-0.7794988336,2.2254089124,-1.7093223217,"https://github.com/grantma/py-magcode-core","https://github.com/grantma/py-magcode-core",2649.7967939815,0,2,0,1,0,0,0,1,1,"1",2,1,-0.503586991818112,1,1,0,0 +"markdown",-0.0672775301,0.0633658209,-0.1115484973,"https://salsa.debian.org/python-team/packages/python-markdown","https://github.com/Python-Markdown/markdown",5779.5951967593,101,82,0,147,24,0,96,260,4,"4",1.44808743169399,1.09230769230769,1.64927116148619,1.04513525072485,1.36923076923077,0,0 +"multipletau",-0.6987933509,0.5806821661,-0.9526942305,"https://salsa.debian.org/python-team/packages/python-multipletau","https://github.com/FCS-analysis/multipletau",3692.0178935185,2,10,0,4,7,0,0,7,2,"2",1.83333333333333,2,0.213313556694086,1.4142135623731,1,0,0 +"murmurhash",-0.581276748,1.7599072349,-1.1918965779,"https://salsa.debian.org/python-team/packages/python-murmurhash","https://github.com/explosion/murmurhash",3382.167962963,3,8,0,7,24,0,0,25,2,"2",1.72727272727273,1.96,0.000180676089016198,1.4,1,1,0 +"python-netfilter",-1.0831097652,1.3819658705,-1.6354879803,"https://salsa.debian.org/python-team/modules/python-netfilter","https://github.com/jlaine/python-netfilter.git",1238.4928935185,0,1,0,1,5,0,0,5,1,"1",2,2,-1.47436424897477,1.4142135623731,1,1,0 +"python-netsyslog",-3.0699282944,-0.7408374792,-3.6931507709,"https://github.com/dpocock/python-netsyslog","https://github.com/dpocock/python-netsyslog",1856.5705092593,0,2,0,2,0,0,0,2,1,"1",2,1,-1.04921436288579,1,1,0,0 +"nine",-0.8784732907,1.5749400058,-1.435685821,"https://salsa.debian.org/python-team/packages/python-nine","https://github.com/nandoflorestan/nine",2401.4576273148,0,3,0,2,5,0,0,5,1,"1",2,2,-0.674409176169887,1.4142135623731,1,0,0 +"noise",-3.7225843383,-1.0965675709,-4.3183675373,"https://salsa.debian.org/python-team/packages/python-noise","https://github.com/caseman/noise.git",2101.5036111111,1,8,0,6,49,0,0,49,1,"1",1.88888888888889,2,-0.880735068862328,1.4142135623731,1,0,0 +"nose-random",-2.0063531384,0.3270712054,-2.4723359773,"https://salsa.debian.org/science-team/python-nose-random","https://github.com/fzumstein/nose-random",352.6133101852,0,1,0,1,3,0,0,4,1,"1",2,1.75,-2.08372397071667,1.3228756555323,1,1,0 +"numpysane",-0.4267537204,1.9973501717,-0.9903343511,"https://salsa.debian.org/python-team/packages/python-numpysane","https://github.com/dkogan/numpysane",2696.1738194445,0,2,0,1,3,0,0,3,1,"1",2,2,-0.471686164817431,1.4142135623731,1,0,0 +"padme",-0.8073688582,2.1816485148,-1.677229387,"https://salsa.debian.org/python-team/packages/python-padme","https://github.com/zyga/padme",2875.0020023148,1,3,1,1,3,0,0,3,2,"2",1.75,2,-0.348677695265135,1.4142135623731,1,0,0 +"pkgconfig",0.1589137832,2.4301443545,-0.3239570925,"https://salsa.debian.org/python-team/packages/python-pkgconfig","https://github.com/matze/pkgconfig",2902.384537037,4,12,0,14,42,0,0,42,2,"2",1.75,2,-0.329842388466299,1.4142135623731,1,1,0 +"plaster",-0.2804648853,2.1267152731,-0.8306048313,"https://salsa.debian.org/python-team/packages/python-plaster","https://github.com/pylons/plaster",2744.1181365741,7,5,0,7,13,0,0,13,1,"1",1.41666666666667,2,-0.438707263062782,1.4142135623731,1,0,0 +"plaster_pastedeploy",-0.2975329299,2.1673923637,-0.8381262743,"https://salsa.debian.org/python-team/packages/python-plaster-pastedeploy","https://github.com/Pylons/plaster_pastedeploy.git",2741.5056365741,4,5,0,7,13,0,0,14,1,"1",1.55555555555556,1.92857142857143,-0.440504293159198,1.38873014965883,1,0,0 +"pluginbase",-0.2812881057,2.0590234382,-0.7551622974,"https://salsa.debian.org/python-team/packages/python-pluginbase","https://github.com/mitsuhiko/pluginbase.git",2511.8068518519,1,9,0,7,38,0,1,40,1,"1",1.9,1.95,-0.598504534022758,1.39642400437689,1.025,0,0 +"python-popcon",-0.2335331727,2.0183447681,-1.1098924395,"https://github.com/venthur/python-popcon","https://github.com/venthur/python-popcon",4753.6013657408,3,5,0,5,7,0,0,9,3,"3",1.625,1.77777777777778,0.943532676097582,1.33333333333333,1,1,0 +"python-poppler-qt5",0.1202276082,2.3680686792,-0.3076713871,"https://salsa.debian.org/python-team/packages/python-poppler-qt5","https://github.com/frescobaldi/python-poppler-qt5",3161.7950231482,7,7,1,11,89,0,1,90,2,"2",1.5,1.98888888888889,-0.151404703923593,1.41027972008708,1.01111111111111,1,0 +"python_portpicker",-0.8378084904,1.8598481156,-1.5521700439,"https://salsa.debian.org/debian/python-portpicker","https://github.com/google/python_portpicker",3069.1269212963,11,7,0,10,15,0,0,15,2,"2",1.38888888888889,2,-0.215147237131493,1.4142135623731,1,1,0 +"pure-python-otr",-0.0437206443,2.0655225856,-0.6499675642,"https://salsa.debian.org/python-team/packages/python-potr","https://github.com/python-otr/pure-python-otr",3956.9618634259,0,15,3,8,52,0,2,54,3,"3",2,1.96296296296296,0.395557494603224,1.40105780143539,1.03703703703704,1,0 +"pretend",-0.7061164562,2.3197823691,-1.5465608612,"https://salsa.debian.org/python-team/packages/python-pretend","https://github.com/alex/pretend",3941.0314351852,2,9,0,9,19,0,0,19,3,"3",1.81818181818182,2,0.384599615561181,1.4142135623731,1,0,0 +"python-progressbar",0.3759281126,2.2892745816,-0.1083290674,"https://salsa.debian.org/python-team/packages/python-progressbar","https://github.com/niltonvolpato/python-progressbar",3503.7755555556,3,12,0,8,61,0,0,63,2,"2",1.8,1.96825396825397,0.0838294813872513,1.4029447488244,1,0,0 +"python-protobix",-3.1476883564,-0.7372721621,-3.7253868496,"https://salsa.debian.org/python-team/packages/python-protobix","https://github.com/jbfavre/python-protobix",3133.4746064815,0,14,1,0,16,0,0,16,2,"2",2,2,-0.170885140705645,1.4142135623731,1,1,0 +"pybadges",-3.4188935767,0.0271868396,-4.2767006556,"https://salsa.debian.org/python-team/packages/python-pybadges","https://github.com/google/pybadges.git",1932.0270833333,2,14,0,12,29,0,0,29,1,"1",1.875,2,-0.997310923810786,1.4142135623731,1,1,0 +"pyqrencode",0.0034268604,1.6950809833,-0.4794074089,"https://salsa.debian.org/debian/python-qrencode","https://github.com/Arachnid/pyqrencode.git",3791.5353703704,0,6,0,5,22,0,0,22,3,"3",2,2,0.281767490099744,1.4142135623731,1,0,0 +"ratelimiter",-0.1714954577,2.6072632937,-0.9266913485,"https://salsa.debian.org/python-team/packages/python-ratelimiter","https://github.com/RazerM/ratelimiter",1781.4938425926,1,5,0,3,29,0,0,30,1,"1",1.83333333333333,1.96666666666667,-1.10085647945562,1.40237893119751,1,0,0 +"rebulk",-0.1999574426,2.0907811548,-0.82792677,"https://salsa.debian.org/python-team/packages/python-rebulk","https://github.com/Toilal/rebulk",3019.4120833333,1,7,2,4,15,0,0,16,2,"2",1.875,1.9375,-0.249344006531674,1.39194109070751,1,1,0 +"rencode",0.3723707617,3.0060692556,-0.2039050857,"https://salsa.debian.org/debian/python-rencode","https://github.com/aresch/rencode.git",4103.1734490741,4,4,0,5,18,0,0,18,3,"3",1.5,2,0.496130363447079,1.4142135623731,1,1,0 +"repoze.tm2",-0.795011466,1.8758832556,-1.600218467,"https://salsa.debian.org/python-team/packages/python-repoze.tm2","https://github.com/repoze/repoze.tm2.git",5299.0136921296,0,6,0,3,8,0,0,8,4,"4",2,2,1.31869913178261,1.4142135623731,1,0,0 +"roman",0.4266969046,1.9457667884,-0.0044298123,"https://salsa.debian.org/python-team/packages/python-roman","https://github.com/zopefoundation/roman",5054.6666666667,3,8,0,8,15,0,0,19,4,"4",1.72727272727273,1.78947368421053,1.15062297533222,1.33771210811988,1,0,0 +"python-signedjson",-0.4972041941,1.1352937233,-0.7813605442,"https://salsa.debian.org/matrix-team/python-signedjson","https://github.com/matrix-org/python-signedjson.git",2409.117025463,5,10,0,10,14,0,0,14,1,"1",1.66666666666667,2,-0.669140594737255,1.4142135623731,1,0,0 +"python-slip",0.6771552086,2.9650065243,-0.0680375927,"https://salsa.debian.org/debian/python-slip","https://github.com/nphilipp/python-slip.git",4760.8424189815,5,3,0,4,10,0,0,11,3,"3",1.375,1.90909090909091,0.948513495467262,1.38169855941551,1,0,0 +"smmap",0.0842345215,1.8862167897,-0.302978642,"https://salsa.debian.org/python-team/packages/python-smmap","https://github.com/gitpython-developers/smmap",4570.872037037,4,18,0,16,38,0,0,38,3,"3",1.81818181818182,2,0.817840770574641,1.4142135623731,1,1,0 +"snuggs",-0.4089829703,1.0919909019,-0.6715786054,"https://salsa.debian.org/debian-gis-team/python-snuggs","https://github.com/mapbox/snuggs.git",1698.5099305556,2,7,0,5,16,0,0,16,1,"1",1.77777777777778,2,-1.15793766125422,1.4142135623731,1,0,0 +"socketpool",-0.433473063,1.9120698535,-1.1349538282,"https://salsa.debian.org/python-team/packages/python-socketpool","https://github.com/benoitc/socketpool",2141.4605208333,0,17,0,11,31,0,0,32,1,"1",2,1.96875,-0.853250372467846,1.40312152004023,1,0,0 +"PySocksipyChain",-0.0678442589,2.0576051001,-0.7593283222,"https://salsa.debian.org/freedombox-team/python-socksipychain","https://github.com/pagekite/PySocksipyChain.git",3262.1183564815,1,7,0,4,12,0,0,12,2,"2",1.875,2,-0.0823964553598615,1.4142135623731,1,1,0 +"pysrp",-0.2655598789,2.0901350297,-0.982879077,"https://salsa.debian.org/python-team/packages/python-srp","https://github.com/cocagne/pysrp",4536.7902777778,2,26,0,14,45,0,0,45,3,"3",1.92857142857143,2,0.794397345836804,1.4142135623731,1,1,0 +"static3",-2.1484350509,0.7824659551,-2.9204988941,"https://salsa.debian.org/debian/python-static3","https://github.com/rmohr/static3",1017.1397800926,0,5,0,4,21,0,0,21,1,"1",2,2,-1.62662384964915,1.4142135623731,1,0,0 +"stopit",-1.4382358759,1.0640373111,-2.3707053284,"https://salsa.debian.org/python-team/packages/python-stopit","https://github.com/glenfant/stopit",2025.0025810185,3,4,0,7,38,0,0,38,1,"1",1.57142857142857,2,-0.933356945793717,1.4142135623731,1,0,0 +"python-subprocess32",0.809721279,3.7269442727,-0.0005664334,"https://salsa.debian.org/python-team/modules/python-subprocess32","https://github.com/google/python-subprocess32",2769.8086226852,4,6,0,6,75,0,0,75,2,"2",1.6,2,-0.421035846131408,1.4142135623731,1,1,0 +"python-sunlight",-0.4386787931,3.6650119727,-1.7599151869,"https://salsa.debian.org/python-team/modules/python-sunlight","https://github.com/sunlightlabs/python-sunlight",1218.8703009259,0,11,0,8,23,0,0,25,1,"1",2,1.92,-1.48786181431778,1.3856406460551,1,0,0 +"python-tblib",-0.7353049539,0.9990220369,-1.1483402151,"https://salsa.debian.org/python-team/packages/python-tblib","https://github.com/ionelmc/python-tblib",3634.6597453704,5,11,0,12,50,0,0,51,2,"2",1.6875,1.98039215686275,0.173859272101993,1.40726406792142,1,0,0 +"urlobject",-1.4032067102,1.0645121312,-1.9682182483,"https://salsa.debian.org/python-team/packages/python-urlobject","https://github.com/zacharyvoase/urlobject",3098.5456481482,4,10,0,8,31,0,0,31,2,"2",1.71428571428571,2,-0.19491131845164,1.4142135623731,1,0,0 +"python-sdk",-2.1064074455,0.1631136587,-2.60808327,"https://salsa.debian.org/pkg-security-team/python-vulndb","https://github.com/vulndb/python-sdk",1623.0260300926,0,3,0,2,5,0,0,5,1,"1",2,2,-1.20985989701572,1.4142135623731,1,0,0 +"word_cloud",-2.3533134617,-0.117333833,-2.7862995006,"https://salsa.debian.org/python-team/packages/python-wordcloud","https://github.com/amueller/word_cloud",4051.6273842593,33,54,0,65,30,0,1,89,3,"3",1.62068965517241,1.33707865168539,0.460673969256065,1.15632117151136,1.01123595505618,1,0 +"python3-xapp",0.4966659567,2.7934932391,-0.0692386084,"https://salsa.debian.org/cinnamon-team/python-xapp","https://github.com/linuxmint/python3-xapp.git",2312.6997685185,5,4,0,7,13,0,0,13,1,"1",1.44444444444444,2,-0.735462015806412,1.4142135623731,1,0,0 +"python-xeddsa",-1.1633252234,1.3819292376,-1.7395228535,"https://salsa.debian.org/python-team/packages/python-xeddsa","https://github.com/Syndace/python-xeddsa",1709.0088425926,1,4,0,1,2,0,0,2,1,"1",1.8,2,-1.15071589631255,1.4142135623731,1,1,0 +"xlrd3",0.2419722546,1.6921113748,-0.1509001314,"https://salsa.debian.org/python-team/packages/python-xlrd","https://github.com/Dragon2fly/xlrd3.git",4601.1105092593,9,44,0,35,8,0,0,42,3,"3",1.83018867924528,1.19047619047619,0.838640558001673,1.09108945117996,1,1,0 +"xmltodict",0.5981063759,3.2438940023,-0.1054526563,"https://salsa.debian.org/debian/python-xmltodict","https://github.com/martinblech/xmltodict.git",3981.1987152778,26,29,0,41,54,0,1,89,3,"3",1.52727272727273,1.60674157303371,0.412229016984181,1.26757310362508,1.01123595505618,1,0 +"pyzor",0.91715325,1.9335464362,0.3494382533,"https://salsa.debian.org/python-team/packages/pyzor","https://github.com/SpamExperts/pyzor",5279.2096064815,6,19,1,17,10,0,0,24,4,"4",1.76,1.41666666666667,1.30507672491499,1.19023807142381,1,0,0 +"q2templates",-5.0482247015,-2.7964556336,-5.4769511928,"https://salsa.debian.org/med-team/q2templates","https://github.com/qiime2/q2templates.git",2619.2390393519,9,8,0,13,13,0,0,15,1,"1",1.47058823529412,1.86666666666667,-0.524606400334206,1.36626010212795,1,1,0 +"q4wine-debian",-0.1511094825,0.0770464397,-0.2120059522,"https://github.com/tehnick/q4wine-debian","https://github.com/tehnick/q4wine-debian",4144.3286111111,0,1,0,1,0,0,0,1,3,"3",2,1,0.524439287773732,1,1,0,0 +"qconf",-0.3811268622,1.6595217121,-0.7762847478,"https://salsa.debian.org/qt-kde-team/extras/qconf","https://github.com/psi-im/qconf.git",5624.6740740741,1,15,0,7,13,0,0,13,4,"4",1.9375,2,1.54270736434326,1.4142135623731,1,1,0 +"qdacco",-1.6662726628,-0.4610104246,-2.0217074624,"https://salsa.debian.org/debian/qdacco","https://github.com/cpina/qdacco.git",5691.2413541667,1,6,0,1,5,0,0,5,4,"4",1.85714285714286,2,1.5884962277932,1.4142135623731,1,1,0 +"qemuctl",1.3474122059,3.3653108214,0.3818068479,"https://github.com/operatornormal/qemuctl","https://github.com/operatornormal/qemuctl",627.1595486111,3,2,0,1,0,0,0,1,1,"1",1.4,1,-1.89487503165093,1,1,0,0 +"qjoypad",0.8529794114,3.2612636032,-0.0822850011,"https://github.com/kilobyte/qjoypad/tree/debian","https://github.com/kilobyte/qjoypad",4422.6630092593,2,12,0,10,1,0,0,11,3,"3",1.85714285714286,1.09090909090909,0.715893944363299,1.04446593573419,1,1,0 +"qmenu",0.2416596829,3.6062250713,-0.9305566725,"https://github.com/teopost/qmenu","https://github.com/teopost/qmenu",3121.65625,0,12,2,5,5,0,0,6,2,"2",2,1.83333333333333,-0.179014496605141,1.35400640077266,1,1,0 +"qmidiarp",0.1060884453,2.4093772481,-0.4462133548,"https://salsa.debian.org/multimedia-team/qmidiarp","https://github.com/emuse/qmidiarp.git",5041.9955208333,2,10,0,5,12,0,0,16,4,"4",1.83333333333333,1.75,1.14190702110496,1.3228756555323,1,0,0 +"qmidinet",0.3987634563,2.3272584853,-0.2919992565,"https://salsa.debian.org/multimedia-team/qmidinet","https://github.com/rncbc/qmidinet.git",4992.0509143519,1,11,0,4,10,0,0,11,4,"4",1.91666666666667,1.90909090909091,1.10755220349702,1.38169855941551,1,0,0 +"qsampler",0.22306551,2.8539174302,-0.5046019625,"https://salsa.debian.org/multimedia-team/qsampler","https://github.com/rncbc/qsampler.git",5737.9962847222,3,14,0,5,5,0,0,7,4,"4",1.82352941176471,1.71428571428571,1.62065699998998,1.30930734141595,1,0,0 +"qsynth",0.1425312579,0.7343171417,-0.1064510745,"https://salsa.debian.org/multimedia-team/qsynth","https://github.com/rncbc/qsynth.git",5674.9236458333,3,19,0,7,24,0,0,25,4,"4",1.86363636363636,1.96,1.57727195488233,1.4,1,0,0 +"qtads",0.5108490252,2.4840737536,-0.3393338609,"https://salsa.debian.org/games-team/qtads","https://github.com/realnc/qtads.git",4788.6839583333,5,7,0,10,20,0,0,22,3,"3",1.58333333333333,1.90909090909091,0.967664532460849,1.38169855941551,1,0,0 +"qterm",-0.9155978148,-0.4024112301,-1.1525455527,"https://salsa.debian.org/chinese-team/qterm","https://github.com/qterm/qterm",4614.8412384259,1,8,0,4,17,0,1,18,3,"3",1.88888888888889,1.94444444444444,0.848085355535883,1.39443337755679,1.05555555555556,0,0 +"ChemmineR",-4.9478723057,-2.463477009,-5.4701350553,"https://salsa.debian.org/r-pkg-team/r-bioc-chemminer","https://github.com/girke-lab/ChemmineR.git",5502.0317476852,2,22,0,10,19,0,0,26,4,"4",1.91666666666667,1.73076923076923,1.45834680870101,1.31558702896054,1,1,0 +"GenomicAlignments",-0.0620075073,2.2952168072,-0.6079488331,"https://salsa.debian.org/r-pkg-team/r-bioc-genomicalignments","https://github.com/Bioconductor/GenomicAlignments.git",3637.7668287037,1,21,0,13,35,0,0,39,2,"2",1.95454545454545,1.8974358974359,0.175996505503721,1.37747446344239,1,1,0 +"GenomicRanges",-0.3216038801,1.2623780689,-0.6013624703,"https://salsa.debian.org/r-pkg-team/r-bioc-genomicranges","https://github.com/Bioconductor/GenomicRanges.git",4977.821712963,4,35,0,17,53,0,0,59,3,"3",1.8974358974359,1.89830508474576,1.0977645276525,1.37778992765434,1,1,0 +"IRanges",-0.2732928737,0.9495069035,-0.572231786,"https://salsa.debian.org/r-pkg-team/r-bioc-iranges","https://github.com/Bioconductor/IRanges.git",5556.7386458333,4,26,0,13,28,0,0,34,4,"4",1.86666666666667,1.82352941176471,1.4959774086833,1.350381209794,1,1,0 +"preprocessCore",-0.5732675432,1.6147898925,-1.0092066733,"https://salsa.debian.org/r-pkg-team/r-bioc-preprocesscore","https://github.com/bmbolstad/preprocessCore.git",2983.7131828704,0,24,0,9,24,0,0,29,2,"2",2,1.82758620689655,-0.273899795446814,1.35188246785605,1,0,0 +"Rsamtools",-0.2310113342,1.6900769525,-0.6158536063,"https://salsa.debian.org/r-pkg-team/r-bioc-rsamtools","https://github.com/Bioconductor/Rsamtools.git",5200.0497569445,3,23,0,13,61,0,1,68,4,"4",1.88461538461538,1.89705882352941,1.2506259566678,1.37733758517272,1.01470588235294,0,0 +"XVector",-0.1488435412,2.1308487448,-0.5902275914,"https://salsa.debian.org/r-pkg-team/r-bioc-xvector","https://github.com/Bioconductor/XVector.git",3819.2003935185,0,10,0,5,3,0,0,7,3,"3",2,1.42857142857143,0.300797108938094,1.19522860933439,1,1,0 +"arm",-0.2157734257,1.5269652897,-0.5053279666,"https://salsa.debian.org/r-pkg-team/r-cran-arm","https://github.com/suyusung/arm.git",2199.2741898148,0,4,0,2,20,0,0,20,1,"1",2,2,-0.813482754039518,1.4142135623731,1,1,0 +"av",-3.30692254,-1.0664029566,-3.7499442887,"https://salsa.debian.org/r-pkg-team/r-cran-av","https://github.com/ropensci/av.git",1927.0685763889,2,3,0,3,37,0,0,37,1,"1",1.6,2,-1.00072167451409,1.4142135623731,1,1,0 +"nozzle",-2.8854861587,-0.5978017889,-3.3250463837,"https://salsa.debian.org/r-pkg-team/r-cran-nozzle.r1","https://github.com/parklab/nozzle.git",926.0286111111,0,1,0,1,13,0,0,13,1,"1",2,2,-1.68929543348816,1.4142135623731,1,1,0 +"r-optparse",-0.2070927617,2.0241027782,-0.6422022567,"https://salsa.debian.org/r-pkg-team/r-cran-optparse","https://github.com/trevorld/r-optparse.git",3364.6461689815,0,11,0,2,23,0,0,23,2,"2",2,2,-0.0118718372613998,1.4142135623731,1,0,0 +"ritis",-0.2993761764,1.9534734206,-0.7980064599,"https://salsa.debian.org/r-pkg-team/r-cran-ritis","https://github.com/ropensci/ritis.git",3983.0266666667,1,4,0,3,12,0,0,12,3,"3",1.8,2,0.41348638872031,1.4142135623731,1,1,0 +"vcdExtra",-0.1359675027,2.0732853363,-0.5645165568,"https://salsa.debian.org/r-pkg-team/r-cran-vcdextra","https://github.com/friendly/vcdExtra.git",5383.4657523148,0,9,0,3,12,0,0,12,4,"4",2,2,1.37679019163224,1.4142135623731,1,1,0 +"vioplot",-0.5117688173,1.754135969,-0.9412408999,"https://salsa.debian.org/r-pkg-team/r-cran-vioplot","https://github.com/TomKellyGenetics/vioplot",2457.8733912037,2,6,0,3,10,0,0,11,1,"1",1.75,1.90909090909091,-0.635603118516041,1.38169855941551,1,1,0 +"radcli",0.8077891464,3.0284268528,0.04850184,"https://salsa.debian.org/debian/radcli","https://github.com/radcli/radcli",0.0082986111,10,25,0,19,27,0,0,35,1,"1",1.71428571428571,1.77142857142857,-2.32626629337538,1.33095025129738,1,1,0 +"radium_compressor",0.1355972195,2.8572373451,-0.7243626073,"https://salsa.debian.org/multimedia-team/radium-compressor","https://github.com/kmatheussen/radium_compressor.git",2426.0817361111,0,1,0,1,4,0,0,4,1,"1",2,2,-0.657471275842851,1.4142135623731,1,0,0 +"rapache",-1.9452855915,-0.2626388012,-2.421875321,"https://salsa.debian.org/r-pkg-team/rapache","https://github.com/jeffreyhorner/rapache.git",4155.5934953704,1,13,0,6,35,0,0,35,3,"3",1.92857142857143,2,0.532187933150424,1.4142135623731,1,1,0 +"redmine_local_avatars",-1.4572727561,1.4827307788,-2.2601628352,"https://salsa.debian.org/debian/redmine-plugin-local-avatars","https://github.com/ncoders/redmine_local_avatars",3991.5587615741,3,11,0,9,47,0,0,48,3,"3",1.78571428571429,1.97916666666667,0.419355261958235,1.40682858467784,1,1,0 +"ree",0.455206434,2.7126650543,-0.2943021607,"https://salsa.debian.org/debian/ree","https://github.com/alexmyczko/ree",1112.0390740741,3,1,0,2,2,0,0,3,1,"1",1.25,1.66666666666667,-1.56134657217033,1.29099444873581,1,0,0 +"remaster-iso",-2.0473516929,0.1202211372,-2.4770101415,"https://github.com/unixabg/remaster-iso","https://github.com/unixabg/remaster-iso",251.8044791667,1,3,0,3,5,0,0,5,1,"1",1.75,2,-2.15306617294626,1.4142135623731,1,1,0 +"python-requests-aws",-0.7617204879,2.8252172293,-1.7279435269,"https://salsa.debian.org/python-team/packages/requests-aws","https://github.com/tax/python-requests-aws",1319.2575,2,12,1,8,18,0,0,18,1,"1",1.85714285714286,2,-1.41880963516713,1.4142135623731,1,1,0 +"resvg",-0.8706965662,2.5429179421,-1.7032916571,"https://salsa.debian.org/debian/resvg","https://github.com/RazrFalcon/resvg.git",2182.7898726852,46,8,0,47,30,0,0,65,1,"1",1.14814814814815,1.46153846153846,-0.824821630212059,1.20894104965398,1,1,0 +"rexical",-1.8414750192,0.9895052788,-2.7520386326,"https://salsa.debian.org/ruby-team/rexical","https://github.com/tenderlove/rexical",5447.083912037,2,10,0,9,23,0,2,29,4,"4",1.83333333333333,1.79310344827586,1.42055047783297,1.33906812682397,1.06896551724138,0,0 +"ripe-atlas-cousteau",-0.9764944882,1.3924863314,-1.4702991314,"https://salsa.debian.org/python-team/packages/ripe-atlas-cousteau","https://github.com/RIPE-NCC/ripe-atlas-cousteau.git",3286.9945949074,5,15,0,13,37,0,0,39,2,"2",1.75,1.94871794871795,-0.065285125546667,1.39596488090423,1,0,0 +"robocut",-0.2824151439,2.3754574352,-1.0923195505,"https://github.com/alpharesearch/robocut","https://github.com/alpharesearch/robocut",831.4363194444,0,6,0,3,0,0,0,3,1,"1",2,1,-1.75436153684282,1,1,0,0 +"robotfindskitten-pkg-debian",0.0179376982,1.3078276454,-0.485626997,"https://github.com/rfinnie/robotfindskitten-pkg-debian","https://github.com/rfinnie/robotfindskitten-pkg-debian",1629.5291319445,3,1,0,3,0,0,0,3,1,"1",1.25,1,-1.20538668371508,1,1,0,0 +"rolo",-0.0498132259,2.1330027792,-0.8216828066,"https://salsa.debian.org/debian/rolo","https://github.com/libvc/rolo",1738.2993634259,2,2,0,2,2,0,0,2,1,"1",1.5,2,-1.13056816522082,1.4142135623731,1,0,0 +"rospack",-0.2414662592,1.0688853941,-0.5553517117,"https://salsa.debian.org/science-team/ros-rospack","https://github.com/ros/rospack.git",3438.9073958333,20,26,0,26,22,0,0,42,2,"2",1.56521739130435,1.52380952380952,0.0392093721738101,1.23442679969674,1,1,0 +"rospkg",-0.0548646672,1.8580305855,-0.5008277906,"https://salsa.debian.org/science-team/ros-rospkg","https://github.com/ros-infrastructure/rospkg.git",4295.6529861111,33,59,0,64,29,0,0,79,3,"3",1.64130434782609,1.36708860759494,0.628529031772351,1.16922564443094,1,1,0 +"std_msgs",-0.0206690342,2.386166873,-0.5747059717,"https://salsa.debian.org/science-team/ros-std-msgs","https://github.com/ros/std_msgs.git",3274.7244560185,3,17,0,9,19,0,0,20,2,"2",1.85,1.95,-0.0737252437746332,1.39642400437689,1,0,0 +"rsh-redone",0.2434579926,2.4765843324,-0.7125516261,"https://salsa.debian.org/debian/rsh-redone","https://github.com/gsliepen/rsh-redone",3762.4461458333,1,2,0,2,0,0,0,2,2,"2",1.66666666666667,1,0.261758222358278,1,1,0,0 +"rt-extension-repeatticket",-1.2713455525,2.448057755,-2.2206005858,"https://salsa.debian.org/request-tracker-team/rt-extension-repeatticket","https://github.com/bestpractical/rt-extension-repeatticket",4204.3307407408,0,5,0,4,3,0,0,7,3,"3",2,1.42857142857143,0.565712257264122,1.19522860933439,1,0,0 +"rtkit",1.5914934939,3.4753341698,0.6818583583,"https://salsa.debian.org/multimedia-team/rtkit","https://github.com/heftig/rtkit",3958.7431828704,18,3,0,13,43,0,0,51,3,"3",1.14285714285714,1.84313725490196,0.396782790164219,1.35762191161677,1,0,0 +"bacon",-1.4997697176,0.69875474,-2.0358441625,"https://salsa.debian.org/ruby-team/ruby-bacon","https://github.com/leahneukirchen/bacon",5364.0763657407,3,17,0,13,38,0,0,42,4,"4",1.85,1.9047619047619,1.36345303901034,1.38013111868471,1,0,0 +"base62",-3.2007890763,-0.5710294937,-3.7408477417,"https://salsa.debian.org/ruby-team/ruby-base62","https://github.com/jtzemp/base62.git",1973.6897222222,1,5,0,3,13,0,1,15,1,"1",1.83333333333333,1.86666666666667,-0.968652927263617,1.36626010212795,1.06666666666667,1,0 +"ruby-beautify",-1.8179395924,0.5723544617,-2.4288221334,"https://salsa.debian.org/ruby-team/ruby-beautify.git","https://github.com/erniebrodeur/ruby-beautify",2708.0809837963,1,19,0,16,45,0,0,50,1,"1",1.95,1.9,-0.463495721677465,1.37840487520902,1,1,0 +"buff-extensions",-1.7001314331,0.6961340583,-2.1479955125,"https://salsa.debian.org/ruby-team/ruby-buff-extensions","https://github.com/RiotGames/buff-extensions",1162.5226851852,0,5,0,3,12,0,0,12,1,"1",2,2,-1.52662099569476,1.4142135623731,1,1,1 +"capture-output",-2.8922262934,-0.7342713061,-3.3221878931,"https://salsa.debian.org/ruby-team/ruby-capture-output","https://github.com/jpastuszek/capture-output",0.0173611111,0,1,0,1,1,0,0,2,1,"1",2,1.5,-2.32626005965854,1.22474487139159,1,0,0 +"color",-1.6594930763,0.7881397104,-2.2203703357,"https://salsa.debian.org/ruby-team/ruby-color","https://github.com/halostatue/color",4994.1460185185,1,11,1,4,30,0,0,30,4,"4",1.91666666666667,2,1.10899333851808,1.4142135623731,1,0,0 +"crb-blast",-0.6967501476,1.5636879643,-1.4854285145,"https://salsa.debian.org/ruby-team/ruby-crb-blast","https://github.com/cboursnell/crb-blast",1070.1020717593,0,5,0,2,15,0,0,15,1,"1",2,2,-1.59019329190743,1.4142135623731,1,1,0 +"em-redis",-2.4322275314,0.3220252422,-3.2383595542,"https://salsa.debian.org/ruby-team/ruby-em-redis","https://github.com/libc/em-redis",3058.3058101852,3,10,0,6,7,0,0,10,2,"2",1.76923076923077,1.7,-0.222590629416015,1.30384048104053,1,0,0 +"encryptor",0.4811221705,4.0560529867,-0.7455390491,"https://salsa.debian.org/ruby-team/ruby-encryptor","https://github.com/attr-encrypted/encryptor",2635.9583564815,1,9,0,5,53,0,0,54,1,"1",1.9,1.98148148148148,-0.513105877435289,1.40765105103555,1,1,0 +"entypo-rails",0.5391017786,4.3530001784,-0.5148206393,"https://salsa.debian.org/ruby-team/ruby-entypo-rails","https://github.com/lwe/entypo-rails",1757.4358333333,1,10,0,7,20,0,0,20,1,"1",1.90909090909091,2,-1.11740498345517,1.4142135623731,1,1,0 +"escape_utils",-0.3520723582,1.3204538371,-0.8030228346,"https://salsa.debian.org/ruby-team/ruby-escape-utils","https://github.com/brianmario/escape_utils.git",4731.6076041667,5,24,0,25,33,0,0,45,3,"3",1.82758620689655,1.73333333333333,0.928404082228849,1.31656117720877,1,1,0 +"faker",-2.043268084,0.4558232112,-2.7260545607,"https://salsa.debian.org/ruby-team/ruby-faker","https://github.com/faker-ruby/faker/issues/new",2746.3319791667,2,17,0,0,0,0,0,881,2,"2",1.89473684210526,1,-0.437184452816799,1,1,0,0 +"ruby-fcgi-ng",0.3005043747,2.2153527182,-0.3456056618,"https://salsa.debian.org/ruby-team/ruby-fcgi","https://github.com/alphallc/ruby-fcgi-ng",3559.9222685185,1,6,0,5,7,0,0,7,2,"2",1.85714285714286,2,0.122450470098899,1.4142135623731,1,0,0 +"ffi-rzmq",-1.7723964358,0.1072926119,-2.431946797,"https://salsa.debian.org/ruby-team/ruby-ffi-rzmq","https://github.com/chuckremes/ffi-rzmq",3424.7133912037,1,37,0,26,23,0,0,39,2,"2",1.97368421052632,1.58974358974359,0.029445906716178,1.26085034391223,1,1,0 +"fission",-1.6562095743,0.8388115306,-2.2192481171,"https://salsa.debian.org/ruby-team/ruby-fission","https://github.com/thbishop/fission",876.3192708333,0,10,0,7,20,0,0,20,1,"1",2,2,-1.72348842125934,1.4142135623731,1,1,0 +"fog-local",-0.5604968871,1.9424075855,-1.1725410205,"https://salsa.debian.org/ruby-team/ruby-fog-local","https://github.com/fog/fog-local",5023.4471759259,4,29,0,20,20,0,0,31,4,"4",1.87878787878788,1.64516129032258,1.12914838606676,1.28263840981104,1,1,1 +"graffiti",-1.4846935384,1.5503379929,-2.3930105658,"https://salsa.debian.org/ruby-team/ruby-graffiti","https://github.com/angdraug/graffiti",3536.2679166667,0,3,0,1,2,0,0,2,2,"2",2,2,0.106179625241902,1.4142135623731,1,0,0 +"hangouts-chat",-1.2144339097,0.4818108524,-1.5637566918,"https://salsa.debian.org/ruby-team/ruby-hangouts-chat","https://github.com/enzinia/hangouts-chat",1065.9778472222,3,4,0,3,4,0,0,4,1,"1",1.57142857142857,2,-1.59303017444046,1.4142135623731,1,1,0 +"html-pipeline",-0.3782141806,2.4999259043,-1.1470246908,"https://salsa.debian.org/ruby-team/ruby-html-pipeline","https://github.com/jch/html-pipeline",4034.7769328704,33,88,0,93,41,0,0,110,3,"3",1.72727272727273,1.37272727272727,0.449083244554035,1.17163444500718,1,1,0 +"rubyinline",-0.5488463078,1.586460929,-1.1539952628,"https://salsa.debian.org/ruby-team/ruby-inline","https://github.com/seattlerb/rubyinline.git",5600.4261805556,0,4,0,3,40,0,0,40,4,"4",2,2,1.52602824685907,1.4142135623731,1,0,0 +"innertube",-0.8869903201,1.6021467977,-1.6544158523,"https://salsa.debian.org/ruby-team/ruby-innertube","https://github.com/basho/innertube.git",1008.2290162037,0,4,0,4,8,0,0,8,1,"1",2,2,-1.63275319353064,1.4142135623731,1,1,0 +"ipaddress",0.3785874101,3.1933979431,-0.2196161692,"https://salsa.debian.org/ruby-team/ruby-ipaddress","https://github.com/bluemonk/ipaddress/issues/new",2746.3319791667,2,17,0,0,0,0,0,56,2,"2",1.89473684210526,1,-0.437184452816799,1,1,1,0 +"jar-dependencies",0.0460603946,2.8173117768,-0.7407876075,"https://salsa.debian.org/ruby-team/ruby-jar-dependencies","https://github.com/mkristian/jar-dependencies",3114.2440277778,4,15,0,15,42,0,1,45,2,"2",1.78947368421053,1.93333333333333,-0.184113055998296,1.39044357430761,1.02222222222222,0,0 +"magic",-0.136206368,2.210685595,-0.7957036211,"https://salsa.debian.org/ruby-team/ruby-magic","https://github.com/qoobaa/magic",2808.4621990741,0,9,0,5,8,0,0,8,2,"2",2,2,-0.394447658531416,1.4142135623731,1,0,0 +"mail-gpg",-0.9409015952,1.9853520354,-1.675246259,"https://salsa.debian.org/ruby-team/ruby-mail-gpg","https://github.com/jkraemer/mail-gpg",4267.9559722222,18,136,0,11,30,0,0,30,3,"3",1.88311688311688,2,0.609477407833895,1.4142135623731,1,1,0 +"markdown-it-html5-embed",-2.8648647448,0.5943602868,-3.688121554,"https://salsa.debian.org/ruby-team/ruby-markdown-it-html5-embed","https://github.com/cmrd-senya/markdown-it-html5-embed",2489.0705555556,3,10,0,7,15,0,0,15,1,"1",1.76923076923077,2,-0.614143886644955,1.4142135623731,1,1,0 +"maxitest",-2.3507463091,0.2011168043,-2.9821664947,"https://salsa.debian.org/ruby-team/ruby-maxitest","https://github.com/grosser/maxitest",3302.3780092593,0,10,0,6,20,0,0,20,2,"2",2,2,-0.0547035146084822,1.4142135623731,1,0,0 +"method_source",0.3967690887,3.2318024051,-0.2913605087,"https://salsa.debian.org/ruby-team/ruby-method-source","https://github.com/banister/method_source",3988.6090393519,4,19,0,20,55,0,0,56,3,"3",1.82608695652174,1.98214285714286,0.417326270720202,1.40788595317336,1,0,0 +"minitar",-0.0660695838,1.7554167483,-0.5639163741,"https://salsa.debian.org/ruby-team/ruby-minitar","https://github.com/halostatue/minitar",5658.6576851852,8,6,1,8,33,0,0,33,4,"4",1.42857142857143,2,1.56608327705199,1.4142135623731,1,0,0 +"minitest-around",-1.7698068776,0.7510788114,-2.5114054563,"https://salsa.debian.org/ruby-team/ruby-minitest-around","https://github.com/splattael/minitest-around",2552.4467708333,2,14,0,7,17,0,0,17,1,"1",1.875,2,-0.570550023965152,1.4142135623731,1,1,0 +"minitest-shared_description",-3.2057434289,-0.7536793446,-3.735520243,"https://salsa.debian.org/ruby-team/ruby-minitest-shared-description","https://github.com/jeremyevans/minitest-shared_description",2605.2266666667,0,2,0,2,2,0,0,2,1,"1",2,2,-0.534244928731338,1.4142135623731,1,0,0 +"mousetrap-rails",-0.5414473391,2.2995115053,-1.3022888739,"https://salsa.debian.org/ruby-team/ruby-mousetrap-rails","https://github.com/kugaevsky/mousetrap-rails",2627.8625810185,0,4,0,3,14,0,2,16,1,"1",2,1.875,-0.518674624673888,1.36930639376292,1.125,1,0 +"mustache",0.3863898236,2.9819707709,-0.4052274614,"https://salsa.debian.org/ruby-team/ruby-mustache","https://github.com/defunkt/mustache",4729.4908680556,23,58,1,62,26,0,0,84,3,"3",1.71604938271605,1.30952380952381,0.926948067492842,1.14434427054266,1,0,1 +"mysql2",0.3134512975,1.4731032493,-0.1330082155,"https://salsa.debian.org/ruby-team/ruby-mysql2","https://github.com/brianmario/mysql2",4877.8413194445,60,107,4,128,39,0,0,163,3,"3",1.64071856287425,1.23926380368098,1.02899217312454,1.11322226158166,1,1,0 +"netrc",0.6689404268,3.5600163117,-0.1237597689,"https://salsa.debian.org/ruby-team/ruby-netrc","https://github.com/heroku/netrc",3633.5661342593,0,30,0,18,43,0,0,45,2,"2",2,1.95555555555556,0.173107022501832,1.3984117975602,1,0,0 +"oauth-ruby",0.0832778896,2.8453147176,-0.5926012173,"https://salsa.debian.org/ruby-team/ruby-oauth","https://github.com/oauth-xx/oauth-ruby",5341.0796643519,47,77,3,86,0,0,0,86,4,"4",1.62096774193548,1,1.34763456455523,1,1,1,1 +"oauth2",-0.165607622,2.3195911932,-0.9005135088,"https://salsa.debian.org/ruby-team/ruby-oauth2","https://github.com/intridea/oauth2",4856.2432986111,41,112,2,108,0,0,0,108,3,"3",1.73202614379085,1,1.01413579285252,1,1,0,0 +"omniauth-cas3",-0.5952547028,1.8217576227,-1.2467001517,"https://salsa.debian.org/ruby-team/ruby-omniauth-cas3","https://github.com/tduehr/omniauth-cas3",3904.2384027778,7,20,0,16,5,0,0,17,3,"3",1.74074074074074,1.29411764705882,0.359291218786245,1.13759291798904,1,1,0 +"omniauth_crowd",-0.5393910023,2.0196041023,-1.2327402235,"https://salsa.debian.org/ruby-team/ruby-omniauth-crowd","https://github.com/robdimarco/omniauth_crowd",3405.9749189815,0,18,0,7,22,0,1,23,2,"2",2,1.95652173913043,0.0165564910054967,1.39875721236047,1.04347826086957,1,0 +"pdf-core",0.4904301487,3.0385774309,-0.1720936555,"https://salsa.debian.org/ruby-team/ruby-pdf-core","https://github.com/prawnpdf/pdf-core",3635.7233912037,6,16,0,15,46,0,0,47,2,"2",1.72727272727273,1.97872340425532,0.174590909833809,1.4066710362609,1,1,0 +"ruby-pgplot",-2.6363964332,-2.1680994385,-2.777770353,"https://salsa.debian.org/ruby-team/ruby-pgplot","https://github.com/masa16/ruby-pgplot",1430.3931597222,0,3,0,2,0,0,0,2,1,"1",2,1,-1.34236403696392,1,1,0,0 +"powerpack",-0.1934084944,2.1339641007,-0.895456645,"https://salsa.debian.org/ruby-team/ruby-powerpack","https://github.com/bbatsov/powerpack.git",2684.7776041667,4,14,0,13,29,0,0,29,1,"1",1.77777777777778,2,-0.479525147339707,1.4142135623731,1,1,1 +"premailer",-0.5173304375,2.1881663412,-1.1678917683,"https://salsa.debian.org/ruby-team/ruby-premailer","https://github.com/premailer/premailer",5001.0799884259,26,100,0,91,2,0,19,111,4,"4",1.79365079365079,1.01801801801802,1.11376292803434,1.0089687894172,1.17117117117117,1,0 +"rack-google-analytics",-2.1861215386,0.6392727132,-2.9350136773,"https://salsa.debian.org/ruby-team/ruby-rack-google-analytics","https://github.com/kangguru/rack-google-analytics",1720.5543634259,2,20,0,17,54,0,0,56,1,"1",1.90909090909091,1.96428571428571,-1.14277421270825,1.40152977645347,1,1,0 +"highlightjs",-1.776057653,0.676887867,-2.5692038823,"https://salsa.debian.org/ruby-team/ruby-rails-assets-highlightjs","https://github.com/components/highlightjs",2389.9739467593,1,13,0,13,40,0,0,41,1,"1",1.92857142857143,1.97560975609756,-0.682308322419022,1.40556385699745,1,1,0 +"jquery.fullscreen",-0.3069663717,3.425973806,-1.5023904978,"https://salsa.debian.org/ruby-team/ruby-rails-assets-jquery-fullscreen-plugin","https://github.com/private-face/jquery.fullscreen",928.6241898148,0,10,3,5,39,0,0,39,1,"1",2,2,-1.68751004284772,1.4142135623731,1,1,0 +"riot",-2.0988502373,0.6683400663,-2.9186141778,"https://salsa.debian.org/ruby-team/ruby-riot","https://github.com/thumblemonks/riot.git",3321.7834953704,13,21,0,20,33,0,7,43,2,"2",1.61764705882353,1.76744186046512,-0.0413552877846599,1.32945171422851,1.16279069767442,0,0 +"ruby2ruby",-1.2632583004,0.5122103892,-1.7609454819,"https://salsa.debian.org/ruby-team/ruby-ruby2ruby","https://github.com/seattlerb/ruby2ruby.git",5438.8588773148,0,3,0,3,34,0,0,35,4,"4",2,1.97142857142857,1.41489281852585,1.40407570003493,1,0,0 +"sdoc",0.2066194576,2.5352625368,-0.2819990512,"https://salsa.debian.org/ruby-team/ruby-sdoc","https://github.com/zzak/sdoc.git",5126.572337963,22,57,0,56,0,0,0,56,4,"4",1.72151898734177,1,1.20008389606809,1,1,1,0 +"sequel_pg",0.6191087607,3.8061270046,-0.2981530837,"https://salsa.debian.org/ruby-team/ruby-sequel-pg","https://github.com/jeremyevans/sequel_pg.git",4773.6626388889,4,7,0,9,45,0,0,47,3,"3",1.63636363636364,1.95744680851064,0.957331991550046,1.39908784874669,1,0,0 +"sexp_processor",0.2542094629,3.0388178614,-0.4829633288,"https://salsa.debian.org/ruby-team/ruby-sexp-processor","https://github.com/seattlerb/sexp_processor",5341.4177430556,0,2,0,1,26,0,0,26,4,"4",2,2,1.34786711483485,1.4142135623731,1,0,0 +"sham_rack",-2.1608189217,0.0182643744,-2.8608854622,"https://salsa.debian.org/ruby-team/ruby-sham-rack","https://github.com/mdub/sham_rack",3267.7854166667,2,5,0,3,12,0,0,12,2,"2",1.71428571428571,2,-0.0784983203508637,1.4142135623731,1,1,0 +"tins",-0.0184774495,2.3442756527,-0.4994282993,"https://salsa.debian.org/ruby-team/ruby-tins","https://github.com/flori/tins.git",5186.4477893519,2,5,0,6,19,0,0,19,4,"4",1.71428571428571,2,1.24126972886517,1.4142135623731,1,1,0 +"toml",0.5450450103,3.0277601672,-0.1659943286,"https://salsa.debian.org/ruby-team/ruby-toml","https://github.com/jm/toml",3202.4776736111,3,24,1,21,69,0,0,69,2,"2",1.88888888888889,2,-0.12342080065706,1.4142135623731,1,0,0 +"truncato",-0.892450421,1.0747849229,-1.3078720915,"https://salsa.debian.org/ruby-team/ruby-truncato","https://github.com/jorgemanrubia/truncato",3523.9293634259,2,13,0,10,27,0,0,28,2,"2",1.86666666666667,1.96428571428571,0.0976924476266089,1.40152977645347,1,1,0 +"twitter",-0.6682623901,1.3259076585,-1.147074381,"https://salsa.debian.org/ruby-team/ruby-twitter","https://github.com/sferik/twitter",5668.765474537,66,150,0,172,52,0,171,383,4,"4",1.69444444444444,1.13577023498695,1.57303600496526,1.06572521551615,1.44647519582245,0,0 +"typed-array",-0.7061785139,1.6402446003,-1.1445021258,"https://salsa.debian.org/ruby-team/ruby-typed-array","https://github.com/yaauie/typed-array",63.5884953704,0,2,0,2,2,0,0,2,1,"1",2,2,-2.28253212031795,1.4142135623731,1,0,0 +"url_safe_base64",-1.0899769047,2.7888654476,-2.2202803102,"https://salsa.debian.org/ruby-team/ruby-url-safe-base64","https://github.com/joenoon/url_safe_base64",1866.2862384259,0,2,0,2,2,0,0,2,1,"1",2,2,-1.04253131686818,1.4142135623731,1,1,0 +"uuid",-0.141865508,3.1821978286,-1.059582524,"https://salsa.debian.org/ruby-team/ruby-uuid","https://github.com/assaf/uuid",4250.514537037,5,18,0,13,78,0,1,81,3,"3",1.78260869565217,1.96296296296296,0.597480169957341,1.40105780143539,1.01234567901235,0,0 +"uuidtools",0.0082132863,1.7860368385,-0.3798291083,"https://salsa.debian.org/ruby-team/ruby-uuidtools","https://github.com/sporkmonger/uuidtools",4302.5516087963,4,20,0,12,66,0,3,70,3,"3",1.83333333333333,1.94285714285714,0.633274307404551,1.39386410487434,1.04285714285714,1,0 +"validates_email",-1.5781922437,0.7480299974,-2.1834264358,"https://salsa.debian.org/ruby-team/ruby-validate-email","https://github.com/perfectline/validates_email.git",4596.2118865741,2,8,0,4,9,0,0,9,3,"3",1.8,2,0.835270999189696,1.4142135623731,1,0,0 +"validates_hostname",-1.2415295122,1.2211165969,-1.7510919236,"https://salsa.debian.org/ruby-team/ruby-validates-hostname","https://github.com/KimNorgaard/validates_hostname",4293.8459722222,0,12,0,5,18,0,0,18,3,"3",2,2,0.627286062071682,1.4142135623731,1,0,0 +"version_sorter",-0.8955692286,1.3134248845,-1.3333811894,"https://salsa.debian.org/ruby-team/ruby-version-sorter","https://github.com/github/version_sorter",5346.8123032407,4,15,0,12,21,0,0,23,4,"4",1.78947368421053,1.91304347826087,1.35157780842703,1.38312814961625,1,1,0 +"websocket-ruby",-2.0302234955,1.0763961168,-2.8933706474,"https://salsa.debian.org/ruby-team/ruby-websocket","https://github.com/imanel/websocket-ruby.git",4172.1994328704,3,14,0,15,38,0,0,39,3,"3",1.82352941176471,1.97435897435897,0.543610466917586,1.40511884705849,1,1,0 +"xml-simple",0.2810527115,2.941255221,-0.5650827802,"https://salsa.debian.org/ruby-team/ruby-xml-simple","https://github.com/maik/xml-simple",3655.0192476852,4,12,0,12,31,0,0,31,2,"2",1.75,2,0.187863726994914,1.4142135623731,1,0,0 +"scalpel",1.9235574134,5.7889102705,0.6091390984,"https://salsa.debian.org/pkg-security-team/scalpel","https://github.com/sleuthkit/scalpel.git",2828.8538888889,1,11,0,5,69,0,0,69,2,"2",1.91666666666667,2,-0.38042106319592,1.4142135623731,1,0,0 +"scanlogd",1.0265172022,3.3179170915,-0.0529925024,"https://salsa.debian.org/debian/scanlogd/","https://github.com/openwall/scanlogd.git",3573.3593287037,0,2,0,1,4,0,0,4,2,"2",2,2,0.131693264954464,1.4142135623731,1,1,0 +"maeparser",-0.1240254936,2.1383222642,-0.7555796895,"https://salsa.debian.org/debichem-team/schroedinger-maeparser","https://github.com/schrodinger/maeparser.git",2087.1343287037,12,14,0,15,15,0,0,16,1,"1",1.53846153846154,1.9375,-0.890619100613526,1.39194109070751,1,1,0 +"science.js",-1.5791662472,1.653426766,-2.4733135985,"https://salsa.debian.org/js-team/science.js/","https://github.com/jasondavies/science.js.git",2725.1817592593,1,8,0,6,30,0,0,30,1,"1",1.88888888888889,2,-0.451732809455812,1.4142135623731,1,1,0 +"scim",1.8800598007,2.6066941269,1.3618783859,"https://github.com/leggewie-DM/scim","https://github.com/leggewie-DM/scim",3009.7372800926,4,5,0,6,2,0,0,7,2,"2",1.55555555555556,1.28571428571429,-0.255998901306964,1.13389341902768,1,0,0 +"scim-anthy",0.002293794,1.4287101867,-0.6578723431,"https://github.com/leggewie-DM/scim-anthy","https://github.com/leggewie-DM/scim-anthy",1414.2472685185,5,3,0,5,1,0,0,6,1,"1",1.375,1.16666666666667,-1.35347012401713,1.08012344973464,1,0,0 +"scim-chewing",1.4542811691,3.3715479543,0.5061771978,"https://salsa.debian.org/debian/scim-chewing","https://github.com/chewing/scim-chewing.git",2973.6130092593,0,11,0,4,6,0,0,6,2,"2",2,2,-0.280847284808795,1.4142135623731,1,0,0 +"scim-tables",0.9359530215,2.2487851526,0.2559891027,"https://github.com/leggewie-DM/scim-tables","https://github.com/leggewie-DM/scim-tables",793.6947685185,3,3,0,3,1,0,0,4,1,"1",1.5,1.25,-1.78032238005786,1.11803398874989,1,0,0 +"sct-deb",0.114819976,2.8309553504,-0.5908234474,"https://github.com/Tookmund/sct-deb","https://github.com/Tookmund/sct-deb",125.8640393519,0,1,0,1,0,0,0,1,1,"1",2,1,-2.23969536364601,1,1,0,0 +"setuptools_scm_git_archive",-1.1288748526,1.4309706158,-1.7245251246,"https://salsa.debian.org/python-team/packages/setuptools-scm-git-archive","https://github.com/Changaco/setuptools_scm_git_archive",2852.8371759259,5,5,0,7,22,0,0,22,2,"2",1.5,2,-0.363923957505401,1.4142135623731,1,0,0 +"sexplib",-1.5719893405,-0.308694773,-1.9907588838,"https://salsa.debian.org/ocaml-team/sexplib310","https://github.com/janestreet/sexplib.git",3950.7644444445,1,18,0,12,43,0,0,48,3,"3",1.94736842105263,1.89583333333333,0.391294547835884,1.37689263682153,1,0,1 +"sgabios-debian",0.6248433625,3.3447922772,-0.1006393146,"https://github.com/ymc/sgabios-debian","https://github.com/ymc/sgabios-debian",1409.8465509259,1,3,0,3,2,0,0,3,1,"1",1.75,1.66666666666667,-1.35649719462373,1.29099444873581,1,0,0 +"showq",0.4980241305,2.6384494868,-0.2994881583,"https://salsa.debian.org/multimedia-team/showq","https://github.com/evandelisle/showq.git",4589.6974189815,2,9,0,4,11,0,1,12,3,"3",1.81818181818182,1.91666666666667,0.830789967868727,1.38443731048635,1.08333333333333,1,0 +"shutdown-qapps",0.083229246,2.5754574312,-0.646790907,"https://github.com/hakaishi/shutdown-qapps","https://github.com/hakaishi/shutdown-qapps",4242.5183217593,1,5,0,2,4,0,0,4,3,"3",1.83333333333333,2,0.591979906029513,1.4142135623731,1,0,0 +"sidedoor",-1.2070083599,0.905385237,-1.6442775708,"https://github.com/daradib/sidedoor","https://github.com/daradib/sidedoor",1283.144525463,0,2,0,2,5,0,0,6,1,"1",2,1.83333333333333,-1.44365024841654,1.35400640077266,1,1,0 +"sight",-2.4142300337,-1.1923515267,-2.6246960575,"https://salsa.debian.org/med-team/sight","https://github.com/IRCAD/sight",5195.7820833333,18,189,0,40,13,0,0,45,4,"4",1.91304347826087,1.28888888888889,1.24769040148273,1.13529242439509,1,1,0 +"signify",-0.42914773,1.9932487279,-0.9002655171,"https://salsa.debian.org/debian/signify-openbsd","https://github.com/aperezdc/signify.git",3467.3640972222,11,5,0,8,28,0,0,30,2,"2",1.3125,1.93333333333333,0.0587835535481971,1.39044357430761,1,1,0 +"sigscheme",0.0095840913,0.5411815775,-0.1766561408,"https://salsa.debian.org/debian/sigscheme","https://github.com/uim/sigscheme.git",4570.4844212963,0,12,0,4,6,0,0,8,3,"3",2,1.75,0.817574145827509,1.3228756555323,1,0,0 +"simple-image-reducer",0.1736790136,2.6063762202,-0.6423729726,"https://salsa.debian.org/python-team/packages/simple-image-reducer","https://github.com/henrythasler/simple-image-reducer",3392.7195833333,3,5,0,5,11,0,0,11,2,"2",1.625,2,0.00743869690103108,1.4142135623731,1,1,0 +"SkyPat",-3.6622190091,-1.2552465603,-4.2901929758,"https://salsa.debian.org/debian/skypat","https://github.com/skymizer/SkyPat",1330.0854513889,4,12,0,7,15,0,1,18,1,"1",1.75,1.83333333333333,-1.41136153773999,1.35400640077266,1.05555555555556,1,0 +"slick-greeter",0.230041088,2.4883516609,-0.403804259,"https://github.com/UbuntuBudgie/slick-greeter/tree/debian","https://github.com/UbuntuBudgie/slick-greeter",2438.3149768519,27,9,0,9,3,0,0,10,1,"1",1.25,1.3,-0.649056538316372,1.14017542509914,1,0,0 +"smarty-gettext",-0.1172764021,0.9213265959,-0.4308872423,"https://salsa.debian.org/debian/smarty-gettext/","https://github.com/smarty-gettext/smarty-gettext.git",3367.1055439815,3,7,0,6,31,0,0,31,2,"2",1.7,2,-0.0101801354840318,1.4142135623731,1,1,0 +"smarty-lexer",-2.1771173058,0.8224220515,-2.9339605005,"https://salsa.debian.org/debian/smarty-lexer/","https://github.com/smarty-php/smarty-lexer.git",2967.1062731482,1,5,0,2,3,0,0,4,2,"2",1.83333333333333,1.75,-0.285322997965191,1.3228756555323,1,1,0 +"smash",-1.6021448383,1.016931715,-2.2070553084,"https://salsa.debian.org/js-team/smash","https://github.com/mbostock/smash.git",1268.6711921296,0,6,0,5,23,0,4,27,1,"1",2,1.85185185185185,-1.45360585247227,1.36082763487954,1.14814814814815,1,0 +"smbldap-tools",4.0992169923,6.2973766162,2.977896731,"https://salsa.debian.org/debian/smbldap-tools","https://github.com/fumiyas/smbldap-tools",3527.4513194445,0,4,0,1,2,0,0,3,2,"2",2,1.66666666666667,0.100115054694046,1.29099444873581,1,0,0 +"snake4.debian",0.095148698,1.3696917472,-0.4120560031,"https://github.com/alexdantas/snake4.debian","https://github.com/alexdantas/snake4.debian",10.4776388889,5,4,0,0,2,0,0,2,1,"1",1.44444444444444,2,-2.31906486961698,1.4142135623731,1,0,0 +"sndfile-tools",0.7443837151,2.9271900432,0.0039892841,"https://salsa.debian.org/multimedia-team/sndfile-tools","https://github.com/libsndfile/sndfile-tools.git",5283.239212963,10,6,0,14,26,0,0,26,4,"4",1.375,2,1.30784852362273,1.4142135623731,1,1,0 +"debian-snetz",-0.1935171339,3.2904821975,-1.2264363982,"https://github.com/paniagua-gustavo/debian-snetz","https://github.com/paniagua-gustavo/debian-snetz",0.188125,0,2,0,1,0,0,0,1,1,"1",2,1,-2.32614259828142,1,1,0,0 +"sord",0.6196290047,2.4503028479,0.0661140316,"https://salsa.debian.org/multimedia-team/sord","https://github.com/drobilla/sord.git",4651.0402893519,0,1,0,1,9,0,0,9,3,"3",2,2,0.872985177153387,1.4142135623731,1,1,0 +"python-sortedcollections",0.0282138035,2.5630571401,-0.4563520078,"https://salsa.debian.org/python-team/packages/sortedcollections","https://github.com/grantjenks/python-sortedcollections",2101.4924884259,2,4,0,4,19,0,0,19,1,"1",1.66666666666667,2,-0.880742719694886,1.4142135623731,1,0,0 +"sosi2osm",-0.0665032677,2.7414888103,-0.7399578074,"https://salsa.debian.org/debian-gis-team/sosi2osm","https://github.com/Gnonthgol/sosi2osm.git",3689.8328125,3,10,0,6,9,0,0,11,2,"2",1.76923076923077,1.81818181818182,0.211810530338736,1.34839972492648,1,1,0 +"spacefm",0.0215364285,0.7019135888,-0.2802976133,"https://github.com/mati75/spacefm.git","https://github.com/mati75/spacefm.git",3876.4630671296,0,4,0,2,1,0,0,2,3,"3",2,1.5,0.34018572056696,1.22474487139159,1,0,0 +"SparkleShare",0.9167518699,2.534959747,0.0535700536,"https://salsa.debian.org/debian/sparkleshare","https://github.com/hbons/SparkleShare",4856.867974537,90,134,3,141,8,0,73,221,3,"3",1.59821428571429,1.03619909502262,1.01456548144174,1.01793864993065,1.33031674208145,1,0 +"speechd-up",-1.2789607706,1.2929705527,-2.0775310838,"https://salsa.debian.org/a11y-team/speechd-up","https://github.com/williamh/speechd-up.git",1059.3273726852,1,4,0,2,3,0,0,5,1,"1",1.8,1.6,-1.59760475928197,1.26491106406735,1,1,0 +"speedpad-debian",-0.3911902301,0.972185266,-0.6939336088,"https://github.com/ltworf/speedpad-debian","https://github.com/ltworf/speedpad-debian",829.1033101852,0,2,0,1,0,0,0,1,1,"1",2,1,-1.75596631688263,1,1,0,0 +"sphinx-argparse",-0.7549373494,1.0088944933,-1.2169968655,"https://salsa.debian.org/python-team/packages/sphinx-argparse","https://github.com/ribozz/sphinx-argparse",2938.5171412037,2,31,0,22,35,0,0,46,2,"2",1.93939393939394,1.76086956521739,-0.304988272811004,1.32697760539407,1,1,0 +"sphinx-astropy",-1.4271235012,-0.7867770371,-1.5421845699,"https://salsa.debian.org/debian-astro-team/sphinx-astropy","https://github.com/astropy/sphinx-astropy",4334.9151736111,3,25,1,17,25,0,1,31,3,"3",1.89285714285714,1.80645161290323,0.655535857643601,1.34404301006449,1.03225806451613,0,0 +"sphinx-autorun",-1.0917758526,1.7268550032,-1.8045400627,"https://salsa.debian.org/python-team/packages/sphinx-autorun","https://github.com/hobarrera/sphinx-autorun",4960.1845949074,3,8,0,6,17,0,0,20,3,"3",1.72727272727273,1.85,1.08563268766782,1.36014705087354,1,0,0 +"sphinx_celery",-1.2937827686,0.4938075079,-1.9951471611,"https://salsa.debian.org/python-team/packages/sphinx-celery","https://github.com/celery/sphinx_celery",2803.725,12,7,1,15,21,0,0,21,2,"2",1.36842105263158,2,-0.397706180754908,1.4142135623731,1,0,0 +"sphinx-paramlinks",-1.1682253235,0.3868734443,-1.5684932781,"https://salsa.debian.org/python-team/packages/sphinx-paramlinks","https://github.com/sqlalchemyorg/sphinx-paramlinks",3511.5527777778,5,5,0,7,18,0,0,19,2,"2",1.5,1.94736842105263,0.0891791091000978,1.39548142984872,1,0,0 +"autoprogram",-1.4560452615,-0.2596772946,-1.6612142206,"https://salsa.debian.org/python-team/packages/sphinxcontrib-autoprogram","https://github.com/sphinx-contrib/autoprogram.git",3291.9937962963,8,16,0,20,46,0,0,53,2,"2",1.66666666666667,1.86792452830189,-0.0618463828274709,1.36672035482826,1,0,0 +"sratom",0.5401649761,2.8512138953,0.0136305168,"https://salsa.debian.org/multimedia-team/sratom","https://github.com/lv2/sratom.git",4263.558912037,3,1,0,4,5,0,0,6,3,"3",1.25,1.83333333333333,0.606452853005739,1.35400640077266,1,1,0 +"python-sshpubkeys",-1.9121140748,-0.1894818509,-2.3312629201,"https://salsa.debian.org/python-team/packages/sshpubkeys","https://github.com/ojarva/python-sshpubkeys.git",3267.3521759259,3,17,0,14,29,0,0,36,2,"2",1.85,1.80555555555556,-0.0787963286380257,1.34370962471642,1,0,0 +"sslsniff",0.7229167902,2.7591250777,-0.184867548,"https://salsa.debian.org/pkg-security-team/sslsniff","https://github.com/moxie0/sslsniff.git",177.084849537,0,2,0,1,0,0,1,2,1,"1",2,1,-2.20446269858746,1,1.5,0,0 +"st",-1.7905650767,0.6769505545,-2.3325670973,"https://salsa.debian.org/debian/st-console","https://github.com/nferraz/st",3551.6255439815,0,6,0,4,35,0,0,36,2,"2",2,1.97222222222222,0.116743498349745,1.40435829552939,1,0,0 +"starfighter",1.1315056363,2.4483606179,0.4071420536,"https://salsa.debian.org/fmneto-guest/starfighter","https://github.com/pr-starfighter/starfighter",4492.0575231482,7,18,0,11,15,0,0,17,3,"3",1.72,1.88235294117647,0.763627544357379,1.37198868114007,1,0,0 +"starjava",-0.5484854258,1.0238215507,-0.8398906165,"https://salsa.debian.org/debian-astro-team/starjava-topcat","https://github.com/Starlink/starjava/issues/new",2746.3319791667,2,17,0,0,0,0,0,29,2,"2",1.89473684210526,1,-0.437184452816799,1,1,0,0 +"starjava",-0.6975561907,0.0612089874,-0.8309402362,"https://salsa.debian.org/debian-astro-team/starjava-ttools","https://github.com/Starlink/starjava/issues/new",2746.3319791667,2,17,0,0,0,0,0,29,2,"2",1.89473684210526,1,-0.437184452816799,1,1,0,0 +"starjava",-0.5724217622,0.5167921554,-0.7890780686,"https://salsa.debian.org/debian-astro-team/starjava-util","https://github.com/Starlink/starjava",5785.0740046296,2,26,0,10,26,0,0,29,4,"4",1.92857142857143,1.89655172413793,1.65303980555716,1.37715348604937,1,0,0 +"staticsite",-0.4550445168,2.6259534139,-1.4004015176,"https://salsa.debian.org/enrico/staticsite","https://github.com/spanezz/staticsite",2745.0971527778,0,7,1,5,10,0,0,11,1,"1",2,1.90909090909091,-0.438033838533431,1.38169855941551,1,1,0 +"stex",-4.0668315454,-2.4954928101,-4.3496245401,"https://salsa.debian.org/debian/stex","https://github.com/dybvig/stex",1828.8861226852,1,7,0,3,5,0,0,6,1,"1",1.875,1.83333333333333,-1.06825730101956,1.35400640077266,1,0,0 +"stlink",0.2330578642,3.0498837848,-0.4676802192,"https://github.com/bluca/stlink","https://github.com/bluca/stlink",4380.0284722222,78,192,0,121,3,0,0,124,3,"3",1.71111111111111,1.0241935483871,0.686567419501119,1.01202448013232,1,1,0 +"stress",0.7791794941,3.5368026661,-0.027963401,"https://salsa.debian.org/debian/stress","https://github.com/resurrecting-open-source-projects/stress",489.8052893519,0,3,0,2,7,0,0,7,1,"1",2,2,-1.98935531404701,1.4142135623731,1,1,1 +"subdownloader",0.2576738138,1.416208065,-0.2677955961,"https://salsa.debian.org/python-team/packages/subdownloader","https://github.com/subdownloader/subdownloader",4731.6769560185,4,22,3,10,23,0,0,27,3,"3",1.84615384615385,1.85185185185185,0.928451786483367,1.36082763487954,1,0,0 +"subtitleeditor",0.4715189003,1.2173077891,0.045958129,"https://salsa.debian.org/debian/subtitleeditor","https://github.com/kitone/subtitleeditor",5679.7465856482,2,6,0,6,54,0,1,55,4,"4",1.75,1.98181818181818,1.58058945459547,1.40777064247632,1.01818181818182,1,0 +"subvertpy",-0.0856463379,0.9174986859,-0.5281506467,"https://salsa.debian.org/python-team/packages/subvertpy","https://github.com/jelmer/subvertpy",3827.0174421296,14,36,0,29,16,0,0,41,3,"3",1.72,1.39024390243902,0.30617413156749,1.17908604539237,1,1,0 +"suil",0.6666244731,2.9498824035,0.0198598554,"https://salsa.debian.org/multimedia-team/suil","https://github.com/lv2/suil.git",4625.665625,6,1,0,7,14,0,0,15,3,"3",1.14285714285714,1.93333333333333,0.855531000875175,1.39044357430761,1,1,0 +"lv2",0.0271485834,2.3196893623,-0.405826923,"https://salsa.debian.org/multimedia-team/swh-lv2","https://github.com/swh/lv2",4769.9272800926,1,14,0,7,17,0,1,19,3,"3",1.93333333333333,1.89473684210526,0.954762593587227,1.37649440322337,1.05263157894737,0,0 +"ladspa",0.7083949622,1.4520571608,0.2842081476,"https://salsa.debian.org/multimedia-team/swh-plugins","https://github.com/swh/ladspa.git",5572.5839930556,1,25,0,15,58,0,0,58,4,"4",1.96153846153846,2,1.50687676403129,1.4142135623731,1,0,0 +"swift-bench",-3.6971618893,-0.9738891515,-4.3114902928,"https://salsa.debian.org/openstack-team/services/swift-bench","https://github.com/openstack/swift-bench.git",4746.0268287037,8,47,0,37,2,0,0,39,3,"3",1.85454545454545,1.05128205128205,0.938322467093911,1.02532046272473,1,0,0 +"swupdate",-4.1380420208,-0.3765046535,-5.2410349606,"https://salsa.debian.org/debian/swupdate","https://github.com/sbabic/swupdate",3657.1083217593,179,6,0,128,0,0,1,129,2,"2",1.03243243243243,1,0.189300714166129,1,1.0077519379845,1,0 +"sxid",0.3383169662,2.494076504,-0.6427792124,"https://salsa.debian.org/debian/sxid","https://github.com/taem/sxid",1429.0293865741,0,1,0,1,2,0,0,3,1,"1",2,1.66666666666667,-1.34330211979332,1.29099444873581,1,1,0 +"synthv1",0.0241434868,1.3740935149,-0.399365925,"https://salsa.debian.org/multimedia-team/synthv1","https://github.com/rncbc/synthv1.git",4117.1360763889,0,14,0,3,15,0,0,15,3,"3",2,2,0.505734674072817,1.4142135623731,1,1,0 +"syrep",-0.3840410127,1.5663799383,-1.1500496799,"https://github.com/JonathonReinhart/syrep","https://github.com/JonathonReinhart/syrep",0.0023611111,1,1,0,1,2,0,0,3,1,"1",1.5,1.66666666666667,-2.32627037753469,1.29099444873581,1,0,0 +"syslog-ng-debian",0.3360880552,0.5117634173,0.1859714072,"https://github.com/gcsideal/syslog-ng-debian","https://github.com/gcsideal/syslog-ng-debian",4178.4473842593,0,12,0,6,7,0,0,8,3,"3",2,1.875,0.547908172826408,1.36930639376292,1,0,1 +"ocaml-syslog",-0.9966573409,1.2541731317,-1.7322570063,"https://salsa.debian.org/ocaml-team/syslog-ocaml","https://github.com/geneanet/ocaml-syslog.git",690.8139351852,1,3,0,2,3,0,0,3,1,"1",1.75,2,-1.85108982650545,1.4142135623731,1,0,0 +"systemd-bootchart",0.0589352376,2.4948219717,-0.5217369948,"https://salsa.debian.org/systemd-team/systemd-bootchart","https://github.com/systemd/systemd-bootchart",2813.8079282408,13,11,0,15,41,0,0,41,2,"2",1.45833333333333,2,-0.390770553765923,1.4142135623731,1,0,0 +"systemd-cron",0.2435713073,1.0673184216,-0.1917909328,"https://salsa.debian.org/systemd-team/systemd-cron","https://github.com/systemd-cron/systemd-cron.git",3852.6322916667,2,17,0,15,36,0,0,42,3,"3",1.89473684210526,1.85714285714286,0.323793521245326,1.36277028773849,1,1,0 +"systemfixtures",-2.6293231508,-0.9364247044,-3.0058243691,"https://salsa.debian.org/python-team/modules/systemfixtures","https://github.com/testing-cabal/systemfixtures.git",2181.1332638889,4,4,0,5,9,0,0,9,1,"1",1.5,2,-0.825961142504858,1.4142135623731,1,0,0 +"systray-mdstat",-0.4934338937,2.3728697502,-1.2391690443,"https://github.com/xtaran/systray-mdstat","https://github.com/xtaran/systray-mdstat",1731.2023611111,1,1,0,2,1,0,0,2,1,"1",1.5,1.5,-1.13544989794964,1.22474487139159,1,1,0 +"systune",-0.2655422679,0.9388013102,-0.7018488457,"https://github.com/sudipm-mukherjee/systune.git","https://github.com/sudipm-mukherjee/systune.git",176.0601736111,1,4,0,2,3,0,0,3,1,"1",1.8,2,-2.20516753054073,1.4142135623731,1,0,0 +"sysvinit",1.5203549982,1.687243769,1.3661977311,"https://salsa.debian.org/debian/sysvinit","https://github.com/slicer69/sysvinit",5198.3006944445,2,8,0,4,17,0,0,19,4,"4",1.8,1.89473684210526,1.24942284931737,1.37649440322337,1,0,0 +"tap-plugins",0.09238064,1.3104592411,-0.1802167379,"https://salsa.debian.org/multimedia-team/tap-plugins","https://github.com/tomszilagyi/tap-plugins.git",5078.9168287037,3,8,0,0,2,0,0,2,4,"4",1.72727272727273,2,1.16730365323593,1.4142135623731,1,0,0 +"tclsignal",0.119740533,2.2371868408,-0.3075114676,"https://salsa.debian.org/tcltk-team/tcl-signal","https://github.com/wjoye/tclsignal",2449.858275463,1,4,0,3,4,0,0,4,1,"1",1.8,2,-0.641116383286299,1.4142135623731,1,1,0 +"terminaltables",0.4124929606,3.3980129071,-0.3182990743,"https://git.progress-linux.org/users/daniel.baumann/debian/packages/terminaltables","https://github.com/matthewdeanmartin/terminaltables",2707.668125,1,11,0,9,4,0,0,12,1,"1",1.91666666666667,1.33333333333333,-0.463779710072689,1.15470053837925,1,1,1 +"termrec",-0.546232522,1.7238998812,-0.9959233042,"https://github.com/kilobyte/termrec/tree/debian","https://github.com/kilobyte/termrec",5312.9533564815,0,2,0,1,8,0,0,8,4,"4",2,2,1.32828764714119,1.4142135623731,1,0,0 +"tesseract-lang-debian",0.323928139,1.2279995331,-0.0238272916,"https://github.com/AlexanderP/tesseract-lang-debian","https://github.com/AlexanderP/tesseract-lang-debian",1566.6614814815,0,5,0,3,2,0,0,3,1,"1",2,1.66666666666667,-1.24863072581,1.29099444873581,1,0,0 +"testpath",0.178377175,1.4251577183,-0.1467982799,"https://salsa.debian.org/python-team/packages/testpath","https://github.com/jupyter/testpath.git",2578.9209490741,1,9,0,7,23,0,0,23,1,"1",1.9,2,-0.552339537811426,1.4142135623731,1,0,0 +"brev-cls",-0.9042148426,0.8986607838,-1.4914577347,"https://salsa.debian.org/debian/tetex-brev","https://github.com/asgeirn/brev-cls.git",3127.5767708333,2,4,0,3,3,0,0,3,2,"2",1.66666666666667,2,-0.174942016557715,1.4142135623731,1,0,0 +"tex-common",0.1512318896,0.2576765609,0.0745875585,"https://github.com/debian-tex/tex-common","https://github.com/debian-tex/tex-common",5410.6258333333,2,8,0,3,1,0,0,3,4,"4",1.8,1.33333333333333,1.39547248178012,1.15470053837925,1,0,0 +"tex-gyre",1.3108709384,3.2134416841,0.4567270817,"https://github.com/debian-tex/tex-gyre","https://github.com/debian-tex/tex-gyre",5218.6495833333,2,7,0,3,2,0,0,3,4,"4",1.77777777777778,1.66666666666667,1.26342000367595,1.29099444873581,1,0,0 +"texext",-0.4966012771,2.4692944946,-1.3814646844,"https://salsa.debian.org/python-team/packages/texext","https://github.com/matthew-brett/texext.git",2951.8081134259,0,5,0,4,11,0,0,11,2,"2",2,2,-0.295845965789405,1.4142135623731,1,0,0 +"texinfo",1.2380835186,1.5944121073,0.9657638025,"https://github.com/debian-tex/texinfo","https://github.com/debian-tex/texinfo",5779.8813425926,3,9,0,5,6,0,0,6,4,"4",1.75,2,1.64946798930415,1.4142135623731,1,0,0 +"texlive-nonbin",1.1567962942,1.3629616108,0.9821522688,"https://github.com/debian-tex/texlive-nonbin/tree/master/texlive-base","https://github.com/debian-tex/texlive-nonbin",4319.3633101852,4,9,0,6,2,0,0,6,3,"3",1.69230769230769,1.33333333333333,0.64483837759319,1.15470053837925,1,0,0 +"texlive-bin",0.977654239,1.2601203851,0.7506196709,"https://github.com/debian-tex/texlive-bin","https://github.com/debian-tex/texlive-bin",4308.437662037,3,11,0,5,3,0,0,5,3,"3",1.78571428571429,1.6,0.637323078628531,1.26491106406735,1,0,0 +"texlive-nonbin",0.8703298986,1.0658084365,0.7081177712,"https://github.com/debian-tex/texlive-nonbin/tree/master/texlive-extra","https://github.com/debian-tex/texlive-nonbin",4319.3633101852,4,9,0,6,2,0,0,6,3,"3",1.69230769230769,1.33333333333333,0.64483837759319,1.15470053837925,1,0,0 +"texlive-nonbin",0.7296144256,1.0788261732,0.4593754059,"https://github.com/debian-tex/texlive-nonbin/tree/master/texlive-lang","https://github.com/debian-tex/texlive-nonbin",4319.3633101852,4,9,0,6,2,0,0,6,3,"3",1.69230769230769,1.33333333333333,0.64483837759319,1.15470053837925,1,0,0 +"texworks",0.3457955776,1.3076412249,-0.0653044306,"https://github.com/debian-tex/texworks","https://github.com/debian-tex/texworks",4991.6789583333,1,9,0,5,2,0,0,5,4,"4",1.9,1.4,1.10729635042144,1.18321595661992,1,0,0 +"texworks-manual",0.1987398847,2.5940035152,-0.3212280071,"https://github.com/debian-tex/texworks-manual","https://github.com/debian-tex/texworks-manual",1933.1899652778,2,5,0,3,1,0,0,3,1,"1",1.71428571428571,1.33333333333333,-0.996511025685295,1.15470053837925,1,1,0 +"thunar-dropbox",0.1154555368,2.1832206667,-0.4180527247,"https://salsa.debian.org/xfce-extras-team/thunar-dropbox-plugin","https://github.com/jeinzi/thunar-dropbox.git",3052.1741319445,2,6,0,4,6,0,0,9,2,"2",1.75,1.66666666666667,-0.226808355861978,1.29099444873581,1,1,0 +"timbl",-0.4012992985,1.3917222421,-0.9206654469,"https://salsa.debian.org/science-team/timbl","https://github.com/LanguageMachines/timbl.git",2913.2087384259,0,8,0,2,8,0,0,8,2,"2",2,2,-0.322396870508203,1.4142135623731,1,1,0 +"tinyssh",-1.473292065,0.8649169728,-1.916526544,"https://salsa.debian.org/debian/tinyssh","https://github.com/janmojzis/tinyssh.git",3264.9232175926,1,18,0,10,66,0,0,67,2,"2",1.94736842105263,1.98507462686567,-0.0804671080553967,1.40892676419524,1,1,0 +"tp_smapi",0.8443233686,2.0576796454,0.2538706265,"https://salsa.debian.org/debian/tp-smapi","https://github.com/linux-thinkpad/tp_smapi",4476.6966550926,6,7,0,5,90,0,2,92,3,"3",1.53846153846154,1.97826086956522,0.753061442078721,1.40650661909755,1.02173913043478,0,0 +"tpm2-initramfs-tool",-1.4035912508,1.8041112115,-2.1934256167,"https://github.com/timchen119/tpm2-initramfs-tool","https://github.com/timchen119/tpm2-initramfs-tool",486.0112962963,0,2,0,0,6,0,0,6,1,"1",2,2,-1.99196504407821,1.4142135623731,1,1,0 +"trace-cmd",0.0998974637,1.3978799562,-0.3546480844,"https://github.com/sudipm-mukherjee/trace-cmd.git","https://github.com/sudipm-mukherjee/trace-cmd.git",1314.92875,139,17,0,90,1,0,0,90,1,"1",1.10897435897436,1.01111111111111,-1.4217872022599,1.00554020859989,1,0,0 +"trackballs",0.2450481241,1.0347559155,-0.1842061844,"https://salsa.debian.org/games-team/trackballs","https://github.com/trackballs/trackballs.git",2063.1770717593,6,7,0,7,20,0,0,20,1,"1",1.53846153846154,2,-0.907098301285934,1.4142135623731,1,1,0 +"tran",-0.5507488829,1.9378847892,-1.0913812007,"https://github.com/kilobyte/tran/tree/debian","https://github.com/kilobyte/tran",4999.4501736111,0,1,0,1,3,0,0,3,4,"4",2,2,1.11264184620706,1.4142135623731,1,0,0 +"triangle",-0.1711886516,3.1308185907,-1.215472085,"https://salsa.debian.org/science-team/triangle","https://github.com/libigl/triangle.git",2528.1501736111,2,7,0,5,8,0,0,8,1,"1",1.77777777777778,2,-0.587262642701534,1.4142135623731,1,0,0 +"triggerhappy",1.5982884158,4.4832077788,0.3890624079,"https://github.com/wertarbyte/triggerhappy","https://github.com/wertarbyte/triggerhappy",2171.0642708333,5,5,0,7,41,0,0,44,1,"1",1.5,1.93181818181818,-0.832887184059507,1.38989862285642,1,0,0 +"Trimage",1.2553852758,3.9585208411,0.1886888721,"https://salsa.debian.org/debian-phototools-team/trimage","https://github.com/Kilian/Trimage",4077.9117708333,2,17,0,9,64,0,0,66,3,"3",1.89473684210526,1.96969696969697,0.478753905615614,1.40345893053447,1,0,0 +"trivial-features",0.2637949915,3.2767480587,-0.566814757,"https://salsa.debian.org/common-lisp-team/trivial-features","https://github.com/trivial-features/trivial-features",5548.6738657407,11,9,0,15,24,0,0,24,4,"4",1.45,2,1.4904299818709,1.4142135623731,1,1,0 +"trocla",-1.1282943752,1.854915092,-2.1296966635,"https://salsa.debian.org/ruby-team/trocla","https://github.com/duritong/trocla",4222.9344444445,2,25,0,16,33,0,0,34,3,"3",1.92592592592593,1.97058823529412,0.578508971315935,1.40377641926844,1,1,0 +"trollsift",-2.0282713827,0.319975344,-2.4783042686,"https://salsa.debian.org/debian-gis-team/trollsift","https://github.com/pytroll/trollsift",3470.9592824074,4,15,0,12,21,0,0,22,2,"2",1.78947368421053,1.95454545454545,0.0612565319137453,1.39805059083906,1,0,0 +"tslib-debian",0.1336789289,0.9994750001,-0.093473923,"https://github.com/merge/tslib-debian","https://github.com/merge/tslib-debian",1295.9506018519,2,3,0,1,1,0,0,1,1,"1",1.6,2,-1.43484148107191,1.4142135623731,1,0,0 +"tty-clock",-0.284505417,0.4575702587,-0.4967187932,"https://github.com/anarcat/tty-clock/tree/debian","https://github.com/anarcat/tty-clock",3142.1821759259,0,24,0,13,1,0,0,14,2,"2",2,1.07142857142857,-0.164895565831684,1.03509833901353,1,0,0 +"tweepy",0.3014929332,2.3332026362,-0.5274701476,"https://salsa.debian.org/python-team/packages/tweepy","https://github.com/tweepy/tweepy.git",5164.9313194445,72,189,0,197,21,0,0,215,4,"4",1.72413793103448,1.09767441860465,1.22646944408345,1.04769958413882,1,1,0 +"twms",-0.5922081551,1.2383570594,-1.1972199961,"https://salsa.debian.org/debian/twms","https://github.com/Komzpa/twms.git",2177.2821875,3,11,0,4,5,0,0,5,1,"1",1.78571428571429,2,-0.828610137786945,1.4142135623731,1,1,0 +"uhub-debian",-0.2796838226,3.5742395891,-1.580799445,"https://github.com/tehnick/uhub-debian","https://github.com/tehnick/uhub-debian",4037.2023148148,0,1,0,1,1,0,0,2,3,"3",2,1.5,0.450751563922223,1.22474487139159,1,0,0 +"ukui-biometric-auth",-1.2310843043,0.7537049181,-1.6740612047,"https://github.com/ukui/ukui-biometric-auth","https://github.com/ukui/ukui-biometric-auth",1260.5815625,5,11,0,8,6,0,0,10,1,"1",1.6875,1.6,-1.45917037224768,1.26491106406735,1,0,0 +"ukui-control-center",-2.2036628317,0.0511944606,-2.8931977038,"https://github.com/ukui/ukui-control-center","https://github.com/ukui/ukui-control-center",1921.8410069445,76,81,0,41,13,0,0,52,1,"1",1.51592356687898,1.25,-1.00431750212086,1.11803398874989,1,1,0 +"ukui-indicators",-1.377804594,1.2157849638,-2.1158896015,"https://github.com/ukui/ukui-indicators","https://github.com/ukui/ukui-indicators",1239.8214814815,3,9,0,5,4,0,0,5,1,"1",1.75,1.8,-1.47345036857085,1.34164078649987,1,1,0 +"ukui-power-manager",-0.3190978856,2.9128539736,-1.1219811752,"https://github.com/ukui/ukui-power-manager","https://github.com/ukui/ukui-power-manager",1544.224537037,3,19,0,9,9,0,0,14,1,"1",1.86363636363636,1.64285714285714,-1.26406416674336,1.28173988892331,1,0,0 +"ukui-settings-daemon",0.1219875774,3.2976507371,-0.6818364877,"https://github.com/ukui/ukui-settings-daemon","https://github.com/ukui/ukui-settings-daemon",1595.2230439815,10,31,0,10,21,0,0,26,1,"1",1.75609756097561,1.80769230769231,-1.22898441483845,1.34450448407296,1,1,0 +"ukui-themes",-0.5826962952,2.2384569095,-1.2986461297,"https://github.com/ukui/ukui-themes","https://github.com/ukui/ukui-themes",1509.1822916667,6,9,0,8,12,0,0,13,1,"1",1.6,1.92307692307692,-1.28816826993051,1.38675049056307,1,0,0 +"unburden-home-dir",-0.501169023,0.195057165,-0.7613384703,"https://github.com/xtaran/unburden-home-dir","https://github.com/xtaran/unburden-home-dir",4201.5461342593,1,10,2,6,17,0,0,17,3,"3",1.90909090909091,2,0.563796842276971,1.4142135623731,1,1,1 +"underscore",0.5577202877,2.1670034109,0.0619794849,"https://salsa.debian.org/js-team/underscore","https://github.com/jashkenas/underscore.git",5084.8093171296,25,336,0,261,27,0,52,334,4,"4",1.93074792243767,1.08083832335329,1.17135685095617,1.03963374481271,1.15568862275449,1,1 +"Unhide",1.7061388819,3.8742874975,0.7376306506,"https://salsa.debian.org/pkg-security-team/unhide","https://github.com/YJesus/Unhide.git",991.7221296296,2,5,0,5,6,0,0,8,1,"1",1.71428571428571,1.75,-1.6441075942854,1.3228756555323,1,0,0 +"unrar-nonfree",1.8473265605,3.1989063054,1.0595588445,"https://github.com/debian-calibre/unrar-nonfree","https://github.com/debian-calibre/unrar-nonfree",1876.6905902778,7,5,0,5,3,0,0,5,1,"1",1.41666666666667,1.6,-1.03537459594509,1.26491106406735,1,0,0 +"unrardll",-0.7960021888,0.5888362105,-1.105938125,"https://github.com/debian-calibre/unrardll","https://github.com/debian-calibre/unrardll",1864.0022916667,0,4,0,3,1,0,0,3,1,"1",2,1.33333333333333,-1.04410234885474,1.15470053837925,1,0,0 +"vagalume",-1.4511274237,-0.9732880608,-1.5424132302,"https://salsa.debian.org/berto/vagalume","https://github.com/bertogg/vagalume",2090.3450578704,26,3,0,19,0,0,0,19,1,"1",1.10344827586207,1,-0.88841057355362,1,1,0,0 +"valabind",-1.2435397352,-0.3428907439,-1.6087950787,"https://salsa.debian.org/debian/valabind","https://github.com/radare/valabind",4839.9819560185,6,19,0,15,41,0,0,42,3,"3",1.76,1.97619047619048,1.00295029159049,1.4057704208691,1,1,0 +"valinor",-2.9368505692,-1.1020102649,-3.3193721608,"https://salsa.debian.org/python-team/packages/valinor","https://github.com/ARMmbed/valinor.git",1839.1786805556,3,12,0,9,17,0,0,17,1,"1",1.8,2,-1.06117747852685,1.4142135623731,1,0,0 +"variantslib",-2.0986968646,0.447590858,-2.6103147834,"https://salsa.debian.org/ocaml-team/variantslib","https://github.com/janestreet/variantslib.git",3865.5561921296,0,7,0,5,3,0,0,8,3,"3",2,1.375,0.332683334870175,1.17260393995586,1,0,1 +"vcversioner",0.242716431,2.8314661474,-0.3332608567,"https://salsa.debian.org/python-team/packages/vcversioner","https://github.com/habnabit/vcversioner",1010.4509143519,0,4,0,2,18,0,0,18,1,"1",2,2,-1.63122484220299,1.4142135623731,1,0,0 +"vfu-deb",0.7502192139,2.4194817119,-0.0549697238,"https://github.com/bbonev/vfu-deb","https://github.com/bbonev/vfu-deb",1063.877025463,0,1,0,1,0,0,0,1,1,"1",2,1,-1.59447524235567,1,1,0,0 +"vim-autopep8",0.2098655728,3.1531229671,-0.5592658877,"https://salsa.debian.org/python-team/packages/vim-autopep8","https://github.com/tell-k/vim-autopep8.git",1821.7416782407,1,10,0,7,52,0,0,52,1,"1",1.90909090909091,2,-1.07317166721629,1.4142135623731,1,0,0 +"command-t",-0.281217187,1.711936341,-0.8034960415,"https://github.com/yrro/command-t","https://github.com/yrro/command-t",4589.5430092593,66,14,0,60,1,0,0,61,3,"3",1.175,1.01639344262295,0.830683755842708,1.00816340075553,1,1,1 +"volumeicon-debian",0.5582239179,2.4117054016,-0.1176545428,"https://github.com/mati75/volumeicon-debian.git","https://github.com/mati75/volumeicon-debian.git",4377.0106597222,0,5,0,3,1,0,0,3,3,"3",2,1.33333333333333,0.684491591792854,1.15470053837925,1,1,0 +"vpcs",0.5719602774,3.99052142,-0.2987031963,"https://github.com/dlintott/vpcs","https://github.com/dlintott/vpcs",302.5271875,0,2,0,2,1,0,0,2,1,"1",2,1.5,-2.11817613143556,1.22474487139159,1,0,0 +"vpnc",0.7552132496,1.2426452707,0.4176316467,"https://salsa.debian.org/debian/vpnc","https://github.com/streambinder/vpnc",5629.8413888889,11,17,0,19,26,0,0,30,4,"4",1.60714285714286,1.86666666666667,1.54626174529631,1.36626010212795,1,0,0 +"emacs-w3m",-0.0316215167,0.794577588,-0.429835318,"https://salsa.debian.org/debian/w3m-el-snapshot","https://github.com/emacs-w3m/emacs-w3m",5732.8756134259,8,17,0,19,38,0,2,46,4,"4",1.68,1.82608695652174,1.61713470317341,1.35132784938435,1.04347826086957,0,0 +"wadc",-1.3114197782,1.1488153676,-1.8942921561,"https://github.com/jmtd/wadc","https://github.com/jmtd/wadc",2669.3253125,2,7,0,3,5,0,0,5,1,"1",1.77777777777778,2,-0.490154136118143,1.4142135623731,1,0,0 +"wajig",-0.2563640933,-0.2041280932,-0.289877151,"https://github.com/gjwgit/wajig/wajig","https://github.com/gjwgit/wajig",4746.4752546296,1,8,0,5,1,0,0,5,3,"3",1.88888888888889,1.2,0.938630920638354,1.09544511501033,1,1,0 +"wavbreaker",-0.3043692646,1.3080197333,-0.6434518402,"https://salsa.debian.org/multimedia-team/wavbreaker","https://github.com/thp/wavbreaker.git",5680.2477546296,3,6,0,9,15,12,0,28,4,"4",1.66666666666667,1.53571428571429,1.58093418789421,1.23923939806411,1,1,0 +"wbar",0.7206963622,2.6363178504,-0.1640676109,"https://salsa.debian.org/debian/wbar","https://github.com/rodolf0/wbar",1881.7045949074,0,2,0,1,2,0,0,3,1,"1",2,1.66666666666667,-1.03192567069228,1.29099444873581,1,0,0 +"wcc",-2.4281741601,-0.9182887345,-2.9205469788,"https://salsa.debian.org/pkg-security-team/wcc","https://github.com/endrazine/wcc.git",2370.6538888889,7,12,0,16,41,0,4,45,1,"1",1.63157894736842,1.91111111111111,-0.695597786709017,1.38242942355518,1.08888888888889,1,0 +"whysynth",1.6273877466,4.7945023636,0.3840495858,"https://salsa.debian.org/multimedia-team/whysynth","https://github.com/smbolton/whysynth.git",2132.1219444445,2,3,0,3,12,0,0,12,1,"1",1.6,2,-0.859673990775351,1.4142135623731,1,1,0 +"wifite2",0.0691397747,1.3596647886,-0.2821965899,"https://salsa.debian.org/pkg-security-team/wifite","https://github.com/kimocoder/wifite2.git",3100.7875578704,19,31,0,35,28,0,0,57,2,"2",1.62,1.49122807017544,-0.193369201994514,1.22115849510841,1,1,0 +"wildmidi",1.1220449003,2.8689328624,0.3931106893,"https://salsa.debian.org/games-team/WildMIDI","https://github.com/psi29a/wildmidi.git",5284.7473726852,7,25,0,19,8,0,2,25,4,"4",1.78125,1.32,1.30888592397144,1.14891252930761,1.08,0,0 +"win-iconv",-0.1253180043,3.3611034506,-1.2784857777,"https://salsa.debian.org/debian/win-iconv","https://github.com/win-iconv/win-iconv",2428.4399189815,1,14,0,10,21,0,0,25,1,"1",1.93333333333333,1.84,-0.655849179922865,1.35646599662505,1,0,0 +"winregfs",0.1505432946,2.5663630742,-0.3792554253,"https://salsa.debian.org/pkg-security-team/winregfs","https://github.com/jbruchon/winregfs",3358.8025694445,0,4,0,1,4,0,0,4,2,"2",2,2,-0.015891406348249,1.4142135623731,1,0,0 +"wipe",0.0654274281,0.5099289571,-0.121010634,"https://salsa.debian.org/pkg-security-team/wipe","https://github.com/berke/wipe",5088.8252430556,3,5,0,3,11,0,0,12,4,"4",1.625,1.91666666666667,1.17411923937876,1.38443731048635,1,0,0 +"wiimms-iso-tools",-0.0137410528,2.2594017696,-0.6295812818,"https://salsa.debian.org/debian/wit","https://github.com/Wiimm/wiimms-iso-tools",764.4320717593,0,4,0,1,29,0,0,29,1,"1",2,2,-1.80045097212622,1.4142135623731,1,1,0 +"with-simulated-input",-1.6136419534,0.6542791635,-2.0643984034,"https://salsa.debian.org/emacsen-team/with-simulated-input-el","https://github.com/DarwinAwardWinner/with-simulated-input.git",1593.3461921296,0,2,0,2,10,0,0,10,1,"1",2,2,-1.23027542316931,1.4142135623731,1,1,0 +"wmbubble",0.3313340448,2.0551511806,-0.5004056988,"https://salsa.debian.org/wmaker-team/wmbubble","https://github.com/rnjacobs/wmbubble.git",3203.1598148148,0,5,0,2,5,0,0,5,2,"2",2,2,-0.122951584093211,1.4142135623731,1,0,0 +"wmfrog",-0.6195008592,0.7362802602,-1.1251650057,"https://salsa.debian.org/wmaker-team/wmfrog","https://github.com/tcolar/wmfrog",4191.3952777778,0,7,0,2,2,0,0,2,3,"3",2,2,0.556814490276337,1.4142135623731,1,1,0 +"wmpinboard",0.329930821,2.2481564254,-0.5833982398,"https://salsa.debian.org/wmaker-team/wmpinboard","https://github.com/bbidulock/wmpinboard.git",274.6021412037,0,3,0,2,2,0,0,3,1,"1",2,1.66666666666667,-2.13738460938323,1.29099444873581,1,0,0 +"wmsysmon",3.6819786619,6.9497194781,2.2222684502,"https://salsa.debian.org/wmaker-team/wmsysmon","https://github.com/voyageur/wmsysmon.git",1940.3190625,0,3,0,2,3,0,0,3,1,"1",2,2,-0.991607216204502,1.4142135623731,1,1,0 +"wokkel",-0.7494414246,1.5960211892,-1.3587677327,"https://salsa.debian.org/python-team/packages/wokkel","https://github.com/ralphm/wokkel.git",4842.8803125,0,5,0,5,26,0,0,27,3,"3",2,1.96296296296296,1.0049439504718,1.40105780143539,1,0,0 +"wondershaper",2.1493592104,4.1791752632,1.0723154812,"https://github.com/leggewie-DM/wondershaper","https://github.com/leggewie-DM/wondershaper",3187.6698263889,2,1,0,2,2,0,0,4,2,"2",1.33333333333333,1.5,-0.133606502904497,1.22474487139159,1,0,0 +"wreport",-0.1794776423,1.6143054556,-0.8172719944,"https://github.com/ARPA-SIMC/wreport","https://github.com/ARPA-SIMC/wreport",4700.94625,2,14,0,5,11,0,0,11,3,"3",1.875,2,0.907313411899877,1.4142135623731,1,0,0 +"wslay",-0.3233505839,2.0096579304,-1.031639712,"https://salsa.debian.org/debian/wslay","https://github.com/tatsuhiro-t/wslay",2229.7935185185,3,18,1,17,70,0,0,71,1,"1",1.85714285714286,1.98591549295775,-0.79248977711972,1.40922513920159,1,1,0 +"wtf-peewee",-1.1933920451,1.3018762525,-1.741694338,"https://salsa.debian.org/python-team/packages/wtf-peewee","https://github.com/coleifer/wtf-peewee",4437.0799652778,3,18,0,15,46,0,0,46,3,"3",1.85714285714286,2,0.725810768808831,1.4142135623731,1,1,0 +"wxAstroCapture",0.3727354069,3.1734912044,-0.4080125191,"https://salsa.debian.org/science-team/wxastrocapture","https://github.com/wxAstro/wxAstroCapture",45.0595833333,0,3,0,2,2,0,0,3,1,"1",2,1.66666666666667,-2.29527738829289,1.29099444873581,1,0,0 +"x11-touchscreen-calibrator",-0.1154983302,2.6722200137,-0.7875374212,"https://github.com/fourdollars/x11-touchscreen-calibrator","https://github.com/fourdollars/x11-touchscreen-calibrator",2225.1995717593,0,4,0,2,5,0,0,6,1,"1",2,1.83333333333333,-0.79564976203364,1.35400640077266,1,1,0 +"x42-plugins",-0.1526190502,0.5990375172,-0.384890654,"https://salsa.debian.org/multimedia-team/x42-plugins","https://github.com/x42/x42-plugins",3642.2395023148,0,1,0,1,0,0,0,1,2,"2",2,1,0.1790730716628,1,1,1,0 +"xbomb.debian",2.5167931875,5.6510697336,1.1667397783,"https://github.com/alexdantas/xbomb.debian","https://github.com/alexdantas/xbomb.debian",472.1825347222,1,2,0,0,3,0,0,3,1,"1",1.66666666666667,2,-2.00147727402838,1.4142135623731,1,1,0 +"xindy",0.1823763954,0.8822842515,-0.1274514217,"https://github.com/debian-tex/xindy","https://github.com/debian-tex/xindy",2719.8550694445,2,6,0,4,1,0,0,4,1,"1",1.75,1.25,-0.455396817842978,1.11803398874989,1,0,0 +"xml-light",-0.3592724135,1.1896469114,-0.7772314943,"https://salsa.debian.org/ocaml-team/xml-light","https://github.com/ncannasse/xml-light.git",3963.0315046296,3,8,0,8,13,0,0,15,3,"3",1.72727272727273,1.86666666666667,0.399732548351549,1.36626010212795,1,1,0 +"xnec2c",-0.2433745776,0.7919844064,-0.4889064627,"https://salsa.debian.org/debian-hamradio-team/xnec2c","https://github.com/KJ7LNW/xnec2c.git",5761.7881944445,5,7,0,8,22,0,0,22,4,"4",1.58333333333333,2,1.63702246518508,1.4142135623731,1,1,0 +"pkg-xppaut",0.480332333,2.5873961644,-0.4615269769,"https://github.com/neurodebian/pkg-xppaut","https://github.com/neurodebian/pkg-xppaut",171.362349537,6,2,0,3,0,0,0,3,1,"1",1.25,1,-2.20839896833933,1,1,0,0 +"xprintidle",-0.1422188392,0.6249787453,-0.3518989739,"https://salsa.debian.org/debian/xprintidle","https://github.com/g0hl1n/xprintidle",3448.9179861111,2,6,2,2,15,0,0,15,2,"2",1.75,2,0.0460952408865755,1.4142135623731,1,1,0 +"xsecurelock",-0.4681598236,2.8900823642,-1.3517451123,"https://github.com/google/xsecurelock/tree/debian","https://github.com/google/xsecurelock",3375.8872453704,17,12,2,18,50,0,0,63,2,"2",1.41379310344828,1.79365079365079,-0.00413956832858908,1.33927248670717,1,1,0 +"xtermcontrol",-0.0117403008,1.5858545623,-0.4569548478,"https://salsa.debian.org/debian/xtermcontrol","https://github.com/JessThrysoee/xtermcontrol.git",3429.399525463,0,2,0,1,17,0,0,17,2,"2",2,2,0.032669303577349,1.4142135623731,1,0,0 +"xtl",-4.7040789559,-1.5856206073,-5.4305613286,"https://github.com/quantstack-debian/xtl","https://github.com/quantstack-debian/xtl",1473.7952662037,0,3,0,2,1,0,0,3,1,"1",2,1.33333333333333,-1.31250953300406,1.15470053837925,1,1,0 +"xttitle",0.8939077507,4.2706568139,-0.3819440692,"https://salsa.debian.org/debian/xttitle","https://github.com/mojotx/xttitle",2181.5912731482,2,3,0,2,2,0,0,2,1,"1",1.6,2,-0.82564609698394,1.4142135623731,1,1,0 +"xwax",-0.5636629334,0.7271414205,-0.9498118303,"https://salsa.debian.org/multimedia-team/xwax","https://github.com/xwax/xwax.git",5550.8656712963,5,3,0,3,9,0,0,11,4,"4",1.375,1.81818181818182,1.49193763375565,1.34839972492648,1,0,0 +"xxdiff",0.9061004175,1.6510647261,0.4413690153,"https://salsa.debian.org/debian/xxdiff","https://github.com/blais/xxdiff.git",5451.0281134259,4,11,0,8,19,0,0,21,4,"4",1.73333333333333,1.9047619047619,1.4232635299295,1.38013111868471,1,0,0 +"xylib",0.6962815791,3.868426766,-0.2796991398,"https://salsa.debian.org/science-team/xylib","https://github.com/wojdyr/xylib",5291.0453703704,4,4,0,3,17,0,0,17,4,"4",1.5,2,1.31321805464606,1.4142135623731,1,0,0 +"yafc",-0.0272314962,0.4916391321,-0.3253666512,"https://salsa.debian.org/debian/yafc","https://github.com/sebastinas/yafc.git",4536.1716550926,4,14,0,13,27,0,0,28,3,"3",1.77777777777778,1.96428571428571,0.793971821020104,1.40152977645347,1,1,0 +"yagf-debian",1.2564818045,3.6319506109,0.2577483716,"https://github.com/tehnick/yagf-debian","https://github.com/tehnick/yagf-debian",2966.796875,2,1,0,2,3,0,0,3,2,"2",1.33333333333333,2,-0.285535820083504,1.4142135623731,1,0,0 +"yagv",-0.2493109691,1.6805451528,-0.758268769,"https://salsa.debian.org/3dprinting-team/yagv","https://github.com/jonathanwin/yagv.git",1848.8749421296,0,6,0,2,24,0,0,24,1,"1",2,2,-1.05450782345653,1.4142135623731,1,1,0 +"yajl",0.1436910943,0.8155419647,-0.0099540163,"https://github.com/jstamp/yajl","https://github.com/jstamp/yajl",5069.733125,7,28,0,22,4,0,0,23,4,"4",1.8,1.17391304347826,1.16098656540737,1.08347267777192,1,0,0 +"yubikey-personalization-gui-dpkg",1.0660214443,4.6214252569,-0.0477907414,"https://github.com/Yubico/yubikey-personalization-gui-dpkg","https://github.com/Yubico/yubikey-personalization-gui-dpkg",1527.8557986111,0,2,0,2,5,0,0,6,1,"1",2,1.83333333333333,-1.27532354113253,1.35400640077266,1,0,0 +"yubikey-val-dpkg",-1.5796758821,0.5230579445,-2.2238855851,"https://github.com/Yubico/yubikey-val-dpkg","https://github.com/Yubico/yubikey-val-dpkg",2518.4995601852,1,7,0,6,3,0,0,6,1,"1",1.875,1.5,-0.593900898309274,1.22474487139159,1,0,0 +"jay-yydebug",-2.4807565791,0.0572661247,-3.0016851771,"https://salsa.debian.org/java-team/yydebug","https://github.com/jruby/jay-yydebug",0.0429513889,0,1,0,1,2,0,0,3,1,"1",2,1.66666666666667,-2.32624245717074,1.29099444873581,1,0,0 +"zc.lockfile",-0.0210256384,1.5379599647,-0.4550360225,"https://salsa.debian.org/python-team/packages/zc-lockfile","https://github.com/zopefoundation/zc.lockfile",5245.5974305556,1,13,0,10,19,0,0,22,4,"4",1.92857142857143,1.86363636363636,1.28195630702221,1.36515067433466,1,0,0 +"zed",-0.7636785221,-0.0586954945,-1.0152692364,"https://salsa.debian.org/ocaml-team/zed","https://github.com/ocaml-community/zed.git",4544.7564699074,9,14,0,17,38,0,0,40,3,"3",1.60869565217391,1.95,0.799876958089714,1.39642400437689,1,1,0 +"ice-debian-packaging",-0.2246270386,-0.0796274635,-0.3178149444,"https://github.com/zeroc-ice/ice-debian-packaging.git","https://github.com/zeroc-ice/ice-debian-packaging.git",2730.2990046296,3,11,0,8,6,0,0,13,1,"1",1.78571428571429,1.46153846153846,-0.448212869191247,1.20894104965398,1,1,1 +"0install-debian",-0.1790173309,0.2373414985,-0.3531189648,"https://github.com/0install/0install-debian","https://github.com/0install/0install-debian",5324.6795949074,19,12,0,3,0,0,0,3,4,"4",1.38709677419355,1,1.33635363886142,1,1,0,0 +"zfSnap",0.4772336214,3.1494825406,-0.4433726935,"https://github.com/jgoerzen/zfSnap","https://github.com/jgoerzen/zfSnap",4429.3288888889,1,13,0,2,1,0,0,3,3,"3",1.92857142857143,1.33333333333333,0.72047912572731,1.15470053837925,1,0,0 +"zktop",-1.6834481359,1.4483848388,-2.5079762953,"https://salsa.debian.org/python-team/packages/zktop","https://github.com/phunt/zktop.git",4096.6100115741,1,12,0,7,20,0,0,20,3,"3",1.92307692307692,2,0.491615647763463,1.4142135623731,1,0,0 +"zope.deprecation",-0.4002923161,1.2950694538,-0.80228492,"https://salsa.debian.org/python-team/packages/zope.deprecation","https://github.com/zopefoundation/zope.deprecation.git",5564.8963541667,6,19,0,22,15,0,0,26,4,"4",1.76,1.57692307692308,1.50158875696766,1.25575597825496,1,0,1 +"zope.event",0.48012603,2.4451618465,-0.0440353103,"https://salsa.debian.org/debian/zope.event","https://github.com/zopefoundation/zope.event",5503.5143634259,6,21,0,23,14,0,0,26,4,"4",1.77777777777778,1.53846153846154,1.45936663840722,1.24034734589208,1,0,1 +"zope.i18nmessageid",-0.5047792742,1.175715823,-1.0038159767,"https://salsa.debian.org/detiste-guest/zope.i18nmessageid","https://github.com/zopefoundation/zope.i18nmessageid",5530.7271759259,3,23,0,23,15,0,0,30,4,"4",1.88461538461538,1.5,1.47808520034813,1.22474487139159,1,0,1 +"zope.schema",-0.6711277163,0.5898602563,-1.0326400015,"https://salsa.debian.org/python-team/packages/zope.schema","https://github.com/zopefoundation/zope.schema",5503.5836458333,8,46,0,42,30,0,0,56,4,"4",1.85185185185185,1.53571428571429,1.45941429489382,1.23923939806411,1,0,1 +"zope.testing",-0.8046398038,0.1932317872,-1.1600868609,"https://salsa.debian.org/python-team/packages/zope.testing","https://github.com/zopefoundation/zope.testing",5685.8682638889,3,42,0,37,13,0,0,40,4,"4",1.93333333333333,1.325,1.58480030245733,1.15108644332213,1,0,1 +"zope.testrunner",-1.5178214231,-0.9479425765,-1.6556150569,"https://salsa.debian.org/python-team/packages/zope.testrunner","https://github.com/zopefoundation/zope.testrunner",4988.3216666667,11,30,0,30,32,0,0,40,4,"4",1.73170731707317,1.8,1.10498700911337,1.34164078649987,1,0,1 +"zpb-ttf",-0.5400082597,2.49952862,-1.5901447095,"https://salsa.debian.org/debian/zpb-ttf","https://github.com/xach/zpb-ttf",4273.1460416667,0,6,0,4,14,0,0,14,3,"3",2,2,0.613047440750357,1.4142135623731,1,0,0 +"7kaa",0.8733439141,3.7651893226,-0.0927531106,"https://salsa.debian.org/games-team/7kaa","https://github.com/the3dfxdude/7kaa",5126.7096643519,24,23,0,27,66,0,0,78,4,"4",1.48936170212766,1.84615384615385,1.20017835717963,1.35873244097351,1,0,0 +"acmetool",0.6219434866,2.6875450321,-0.2336905662,"https://salsa.debian.org/go-team/packages/acmetool","https://github.com/hlandau/acmetool",2727.716875,7,20,1,21,258,0,5,263,1,"1",1.74074074074074,1.98098859315589,-0.449989008772965,1.40747596539191,1.01901140684411,1,0 +"actiona",0.2685921276,2.3898449586,-0.5658267823,"https://salsa.debian.org/debian/actiona","https://github.com/Jmgr/actiona",4932.3205439815,3,17,0,3,94,0,0,95,3,"3",1.85,1.98947368421053,1.06646616589867,1.41048703794488,1,1,0 +"activemq",-0.707743979,-0.252194711,-0.929017814,"https://salsa.debian.org/java-team/activemq","https://github.com/apache/activemq",5739.1228356482,56,141,2,130,160,0,0,217,4,"4",1.71573604060914,1.73732718894009,1.62143190751885,1.31807708004505,1,1,0 +"allegro5",-0.4762686219,-0.2153924343,-0.5311269802,"https://salsa.debian.org/games-team/allegro5","https://github.com/liballeg/allegro5.git",5772.8158680556,110,47,0,79,223,0,5,242,4,"4",1.29936305732484,1.92148760330579,1.64460794322244,1.38617733472517,1.02066115702479,0,0 +"ariba",-0.7249708667,0.7497238838,-1.1789923052,"https://salsa.debian.org/med-team/ariba","https://github.com/sanger-pathogens/ariba",3026.1963541667,10,22,0,16,112,0,8,122,2,"2",1.6875,1.91803278688525,-0.244677388782445,1.38493060724545,1.0655737704918,1,0 +"asn1crypto",0.9740729842,4.1853024005,0.0865816737,"https://salsa.debian.org/python-team/packages/asn1crypto","https://github.com/wbond/asn1crypto.git",3074.7355092593,14,27,0,32,181,0,0,181,2,"2",1.65853658536585,2,-0.211289322732293,1.4142135623731,1,0,0 +"asymptote",0.2396900664,0.5861261584,0.0399132445,"https://github.com/debian-tex/asymptote","https://github.com/debian-tex/asymptote",4223.6715162037,6,28,0,5,4,0,0,6,3,"3",1.82352941176471,1.66666666666667,0.579015972324356,1.29099444873581,1,0,0 +"aranym800-debian",0.2438262875,1.4111848908,-0.3223074512,"https://github.com/bobek/aranym800-debian","https://github.com/bobek/aranym800-debian",4083.2988773148,1,3,0,2,2,0,0,2,3,"3",1.75,2,0.48245947211508,1.4142135623731,1,0,0 +"atril",0.5207732379,1.2869272543,0.1522121334,"https://salsa.debian.org/debian-mate-team/atril","https://github.com/mate-desktop/atril.git",4392.8799768519,62,42,0,70,244,0,0,278,3,"3",1.40384615384615,1.87769784172662,0.695407435043245,1.3702911521741,1,1,0 +"audacity",2.0595760921,2.587904003,1.6528933115,"https://salsa.debian.org/multimedia-team/audacity","https://github.com/audacity/audacity.git",5069.8878125,215,104,0,197,438,0,8,538,4,"4",1.32601880877743,1.81412639405204,1.16109296850519,1.34689509392976,1.01486988847584,1,1 +"audioread",0.4790726237,2.8379723664,-0.2363043324,"https://salsa.debian.org/python-team/packages/audioread","https://github.com/sampsyo/audioread.git",4407.0006944445,7,21,0,23,126,0,0,127,3,"3",1.75,1.99212598425197,0.705120489396124,1.41142693195644,1,0,0 +"autorandr",-0.3527152165,0.3171262846,-0.518389331,"https://salsa.debian.org/debian/autorandr","https://github.com/phillipberndt/autorandr.git",4779.7076736111,55,58,0,90,351,0,0,363,3,"3",1.51327433628319,1.96694214876033,0.961490119523128,1.40247714732196,1,1,0 +"autosuspend",-1.9250458428,0.6278109958,-2.4672708111,"https://salsa.debian.org/python-team/packages/autosuspend","https://github.com/languitar/autosuspend.git",3337.5962847222,6,9,0,13,40,0,0,46,2,"2",1.6,1.8695652173913,-0.0304783276417025,1.36732045161012,1,1,0 +"backuppc",0.439136868,0.738905733,0.2133448427,"https://salsa.debian.org/debian/backuppc","https://github.com/backuppc/backuppc",4883.1674305556,21,39,0,40,225,0,31,267,3,"3",1.65,1.84269662921348,1.0326557834455,1.35745962341923,1.11610486891386,0,0 +"rsync-bpc",-2.9537265247,0.2336355318,-3.706230506,"https://salsa.debian.org/debian/backuppc-rsync","https://github.com/backuppc/rsync-bpc",2751.3212037037,2,9,0,6,43,0,0,43,2,"2",1.81818181818182,2,-0.433752572759089,1.4142135623731,1,0,0 +"bambam",0.3070932851,2.5075958172,-0.3413586452,"https://github.com/porridge/bambam","https://github.com/porridge/bambam",5711.2973958333,24,13,0,23,24,0,1,35,4,"4",1.35135135135135,1.68571428571429,1.60229194472712,1.2983506020002,1.02857142857143,1,1 +"barclay",0.1851801588,3.0141581768,-0.6020424346,"https://salsa.debian.org/java-team/barclay","https://github.com/broadinstitute/barclay.git",2356.7614351852,7,7,0,8,27,0,1,28,1,"1",1.5,1.96428571428571,-0.705153827826192,1.40152977645347,1.03571428571429,1,0 +"bart",-0.177815138,2.1254373642,-0.6372145565,"https://salsa.debian.org/med-team/bart","https://github.com/mrirecon/bart",3390.8110185185,61,30,0,41,83,0,0,89,2,"2",1.32967032967033,1.93258426966292,0.00612587454192813,1.39017418680643,1,1,0 +"bd",-0.5709314067,1.7639710855,-1.0717735964,"https://salsa.debian.org/debian/bd","https://github.com/vigneshwaranr/bd.git",3272.7792476852,3,12,0,10,56,0,0,57,2,"2",1.8,1.98245614035088,-0.0750632716861125,1.40799720892865,1,0,0 +"Bear",-0.3900185941,0.5954929997,-0.59709973,"https://salsa.debian.org/sramacher/bear","https://github.com/rizsotto/Bear",3987.655787037,44,19,0,53,142,0,2,183,3,"3",1.3015873015873,1.77595628415301,0.41667056809844,1.33265009817019,1.01092896174863,1,0 +"beginend",-0.9812054474,1.1475644093,-1.4790757004,"https://salsa.debian.org/emacsen-team/beginend-el","https://github.com/DamienCassou/beginend.git",3077.3105208333,8,12,0,15,21,0,0,21,2,"2",1.6,2,-0.209518079364983,1.4142135623731,1,0,1 +"benchmark",-0.4007419552,1.9221150293,-1.2040622803,"https://salsa.debian.org/science-team/benchmark","https://github.com/google/benchmark",3640.5849537037,257,68,3,283,68,0,0,319,2,"2",1.20923076923077,1.21316614420063,0.177934976485717,1.10143821624303,1,1,1 +"abc",-0.0691799173,1.1526418635,-0.3926880632,"https://salsa.debian.org/science-team/berkeley-abc","https://github.com/berkeley-abc/abc.git",5782.9116666667,8,47,0,40,75,0,0,104,4,"4",1.85454545454545,1.72115384615385,1.65155242320388,1.31192753083158,1,0,0 +"bernhard",-3.8249138229,-1.4329465737,-4.33451812,"https://salsa.debian.org/python-team/packages/bernhard","https://github.com/b20n/bernhard.git",2059.4699652778,0,14,0,11,32,0,0,32,1,"1",2,2,-0.909648265656412,1.4142135623731,1,1,0 +"betamax",-2.6186759503,-1.7111544465,-2.7929647164,"https://salsa.debian.org/python-team/packages/betamax","https://github.com/sigmavirus24/betamax",3448.4558796296,7,33,2,31,93,0,0,97,2,"2",1.825,1.95876288659794,0.0457773770569086,1.39955810404497,1,0,0 +"bfs",-1.1164889975,-0.5498955731,-1.1990984125,"https://salsa.debian.org/lamby/pkg-bfs","https://github.com/tavianator/bfs.git",2311.7626273148,11,10,0,19,35,0,0,42,1,"1",1.47619047619048,1.83333333333333,-0.736106636264839,1.35400640077266,1,0,0 +"birdfont",0.1539215818,1.5207071994,-0.3971310294,"https://salsa.debian.org/fonts-team/birdfont","https://github.com/johanmattssonm/birdfont.git",4158.8272222222,6,15,0,15,135,0,0,138,3,"3",1.71428571428571,1.97826086956522,0.534412279361438,1.40650661909755,1,1,0 +"bitlbee",0.610414917,1.1334179745,0.2390336103,"https://github.com/bitlbee/bitlbee","https://github.com/bitlbee/bitlbee",5775.5242824074,54,55,0,72,85,0,0,108,4,"4",1.5045871559633,1.78703703703704,1.64647094881239,1.33680104616844,1,0,0 +"black",-0.2598583165,0.6526555806,-0.4835804983,"https://salsa.debian.org/python-team/packages/black","https://github.com/psf/black.git",2098.4397453704,441,11,0,416,699,0,0,1009,1,"1",1.02433628318584,1.69276511397423,-0.882842574679521,1.30106307071342,1,1,1 +"BOSSA",0.0893999446,1.6612263593,-0.4163524525,"https://salsa.debian.org/science-team/bossa","https://github.com/shumatech/BOSSA.git",3233.4649537037,7,26,0,19,214,0,0,214,2,"2",1.78787878787879,2,-0.102105939438884,1.4142135623731,1,1,0 +"bowtie2",-0.4173214178,-0.233072452,-0.4693075159,"https://salsa.debian.org/med-team/bowtie2","https://github.com/BenLangmead/bowtie2",4656.6302777778,6,51,0,28,425,0,1,427,3,"3",1.89473684210526,1.99531615925059,0.876830297704568,1.41255660391029,1.00234192037471,0,0 +"boxbackup",-0.8371100115,0.0115481538,-1.3264648158,"https://salsa.debian.org/debian/boxbackup","https://github.com/boxbackup/boxbackup.git",5737.3015625,2,18,0,6,16,0,3,21,4,"4",1.9,1.76190476190476,1.62017912946675,1.32736760616822,1.14285714285714,0,1 +"breathe",-0.9912135008,-0.8309389737,-1.0391354827,"https://salsa.debian.org/python-team/packages/breathe","https://github.com/michaeljones/breathe.git",5375.5645949074,34,85,0,91,286,0,0,313,4,"4",1.71428571428571,1.91373801916933,1.37135531405994,1.38337920295533,1,0,0 +"brewtarget",0.484432121,2.8570200814,-0.426583819,"https://salsa.debian.org/debian/brewtarget","https://github.com/Brewtarget/brewtarget.git",5451.574212963,13,84,0,55,134,0,15,163,4,"4",1.8659793814433,1.82208588957055,1.42363916908885,1.34984661705342,1.0920245398773,0,0 +"brise",-0.3080442577,1.0357450106,-0.6873683492,"https://salsa.debian.org/debian/brise","https://github.com/rime/brise",2544.8862615741,5,23,0,12,45,0,0,45,1,"1",1.82142857142857,2,-0.575750583843818,1.4142135623731,1,1,0 +"brlaser",0.4072432263,2.1541552875,-0.0102827943,"https://salsa.debian.org/printing-team/brlaser","https://github.com/pdewacht/brlaser",3342.2059837963,4,11,0,13,27,0,3,40,2,"2",1.73333333333333,1.675,-0.0273075073654994,1.29421791055448,1.075,1,0 +"brotli",0.1260775007,0.5454426052,-0.0083599615,"https://salsa.debian.org/debian/brotli","https://github.com/google/brotli",3713.0230555556,77,45,0,97,42,0,5,134,2,"2",1.36885245901639,1.3134328358209,0.227762134057061,1.14605097435537,1.03731343283582,0,1 +"bruteforce-luks",0.4506857269,3.9309060924,-0.3441057365,"https://salsa.debian.org/pkg-security-team/bruteforce-luks","https://github.com/glv2/bruteforce-luks",1977.6153125,2,8,0,3,38,0,0,39,1,"1",1.8,1.97435897435897,-0.96595267697638,1.40511884705849,1,1,0 +"brutespray",-0.0085744737,2.0622651196,-0.445603786,"https://salsa.debian.org/pkg-security-team/brutespray","https://github.com/x90skysn3k/brutespray",2174.873599537,7,10,0,8,19,0,0,21,1,"1",1.58823529411765,1.9047619047619,-0.830266905273788,1.38013111868471,1,1,0 +"bump2version",-0.6601711919,1.365143433,-1.1463637777,"https://salsa.debian.org/debian/bumpversion","https://github.com/c4urself/bump2version",3866.5811574074,20,43,3,48,254,0,0,265,3,"3",1.68253968253968,1.95849056603774,0.333388365856582,1.39946081261239,1,1,1 +"bundler",0.575011715,1.5392481898,0.1010337669,"https://salsa.debian.org/ruby-team/bundler","https://github.com/carlhuda/bundler",4417.961099537,292,766,15,370,17,0,0,383,3,"3",1.72400756143667,1.0443864229765,0.71265969621723,1.02195226061519,1,1,0 +"bzflag",0.8319129626,1.4300701689,0.417821043,"https://salsa.debian.org/games-team/bzflag","https://github.com/BZFlag-Dev/bzflag.git",5782.5434259259,11,63,0,19,30,0,4,39,4,"4",1.85135135135135,1.76923076923077,1.65129912571337,1.33012434352235,1.1025641025641,0,0 +"c-ares",0.3441298781,1.1916406284,0.0308943148,"https://salsa.debian.org/debian/c-ares","https://github.com/c-ares/c-ares.git",5778.6172222222,133,22,0,136,66,0,0,177,4,"4",1.14193548387097,1.3728813559322,1.64859845347597,1.17170019882741,1,1,1 +"caja",1.057062654,1.8090309876,0.5578935766,"https://salsa.debian.org/debian-mate-team/caja","https://github.com/mate-desktop/caja.git",4392.0400925926,58,63,0,86,70,0,0,143,3,"3",1.52066115702479,1.48951048951049,0.694829713591964,1.22045503379292,1,0,0 +"caja-actions",0.1964661335,2.0196315905,-0.3640114639,"https://salsa.debian.org/debian-mate-team/caja-actions","https://github.com/mate-desktop/caja-actions",4195.368599537,3,13,0,7,3,0,0,8,3,"3",1.8125,1.375,0.559547573064481,1.17260393995586,1,1,0 +"caja-admin",0.3402863165,2.9173444791,-0.2366884449,"https://salsa.debian.org/debian-mate-team/caja-admin","https://github.com/infirit/caja-admin",2910.0051851852,15,12,0,17,15,0,0,24,2,"2",1.44444444444444,1.625,-0.324600461547059,1.2747548783982,1,1,1 +"caja-dropbox",1.4193798685,4.6529613875,0.2366380339,"https://salsa.debian.org/debian-mate-team/caja-dropbox","https://github.com/mate-desktop/caja-dropbox.git",4038.0196990741,13,26,0,25,33,0,0,46,3,"3",1.66666666666667,1.71739130434783,0.451313808559276,1.31049277157405,1,0,0 +"caja-extensions",0.9911860003,3.1294289964,0.1496506623,"https://salsa.debian.org/debian-mate-team/caja-extensions","https://github.com/mate-desktop/caja-extensions.git",3680.0453125,11,27,0,20,70,0,0,72,2,"2",1.71052631578947,1.97222222222222,0.20507811614977,1.40435829552939,1,0,0 +"caja-mediainfo-tab",-0.6346427686,1.4919485733,-1.2169751217,"https://salsa.debian.org/debian-mate-team/caja-mediainfo","https://github.com/linux-man/caja-mediainfo-tab",1186.6267013889,1,3,0,1,4,0,0,4,1,"1",1.75,2,-1.51004084543158,1.4142135623731,1,1,0 +"caja-rename",0.3395336681,2.9850659825,-0.2433789434,"https://salsa.debian.org/debian-mate-team/caja-rename","https://github.com/tari01/caja-rename",1145.7519328704,25,4,0,19,9,0,0,26,1,"1",1.13793103448276,1.34615384615385,-1.53815689871839,1.16023870223064,1,1,0 +"camlp4",0.1711187334,1.4277083804,-0.1545568318,"https://salsa.debian.org/ocaml-team/camlp4","https://github.com/ocaml/camlp4.git",5404.4002199074,6,40,0,37,92,0,7,112,4,"4",1.8695652173913,1.82142857142857,1.39119014122702,1.34960311626366,1.0625,1,0 +"Camomile",-0.1749647414,0.504631672,-0.4116548857,"https://salsa.debian.org/ocaml-team/camomile","https://github.com/yoriyuki/Camomile.git",3699.9040972222,2,16,0,11,42,0,0,43,2,"2",1.88888888888889,1.97674418604651,0.218738148235529,1.40596734885505,1,1,0 +"camp",-0.0635736976,2.2422646477,-0.8678185189,"https://salsa.debian.org/med-team/camp","https://github.com/IRCAD/camp.git",3917.821412037,2,16,0,8,2,0,0,9,3,"3",1.88888888888889,1.22222222222222,0.368634405939808,1.10554159678513,1,0,0 +"can-utils",-0.3151818427,1.0524810842,-0.6128426897,"https://salsa.debian.org/debian/can-utils","https://github.com/linux-can/can-utils.git",5750.4572916667,42,46,0,66,298,0,0,305,4,"4",1.52272727272727,1.97704918032787,1.62922840841522,1.40607580888367,1,1,0 +"cftime",-0.053984567,2.1351568503,-0.4726880086,"https://salsa.debian.org/debian-gis-team/cftime/","https://github.com/Unidata/cftime",5698.2503472222,7,40,1,25,111,0,0,112,4,"4",1.85106382978723,1.99107142857143,1.59331742261284,1.41105330465274,1,1,0 +"Charm",-0.4441384118,1.2230812043,-0.8796829957,"https://salsa.debian.org/qt-kde-team/extras/charmtimetracker","https://github.com/KDAB/Charm",5169.2869097222,10,73,1,44,89,0,0,100,4,"4",1.87951807228916,1.89,1.22946547348697,1.37477270848675,1,0,0 +"chaussette",-2.3973132585,0.1079287529,-3.3352905378,"https://github.com/circus-tent/chaussette","https://github.com/circus-tent/chaussette",1782.6774768519,1,42,0,30,80,0,0,81,1,"1",1.97674418604651,1.98765432098765,-1.10004230667586,1.40984194893884,1,0,0 +"selinux",-0.0767985152,0.1858102911,-0.1733620099,"https://salsa.debian.org/selinux-team/checkpolicy","https://github.com/SELinuxProject/selinux",5592.8363425926,179,30,0,124,83,0,12,182,4,"4",1.14354066985646,1.45604395604396,1.52080751298484,1.20666646429076,1.06593406593407,0,0 +"CheeseCutter",-0.8909922436,1.8346147461,-1.5014964432,"https://salsa.debian.org/multimedia-team/cheesecutter","https://github.com/theyamo/CheeseCutter",2936.8167824074,4,11,0,7,20,0,0,21,2,"2",1.73333333333333,1.95238095238095,-0.306157878909246,1.39727626201154,1,1,0 +"cheetah3",0.2580754956,1.2098434945,-0.0894485619,"https://salsa.debian.org/python-team/packages/cheetah","https://github.com/CheetahTemplate3/cheetah3.git",5732.7751157407,17,23,0,34,45,0,0,61,4,"4",1.575,1.73770491803279,1.61706557499544,1.31822036019506,1,0,0 +"chemical-mime",0.9334467969,3.3064633303,0.1037865392,"https://salsa.debian.org/debichem-team/chemical-mime-data","https://github.com/dleidert/chemical-mime",3567.6745833333,0,2,0,1,4,0,0,5,2,"2",2,1.8,0.127782965042091,1.34164078649987,1,0,0 +"CheMPS2",-1.0331384848,-0.1979810762,-1.3111906152,"https://salsa.debian.org/debichem-team/chemps2","https://github.com/SebWouters/CheMPS2",3010.6861342593,0,9,0,4,35,0,0,35,2,"2",2,2,-0.25534622398843,1.4142135623731,1,1,0 +"chromaprint",0.3600324626,1.3936683063,0.0316097075,"https://salsa.debian.org/multimedia-team/chromaprint","https://github.com/acoustid/chromaprint",4607.495162037,12,19,3,25,78,0,3,89,3,"3",1.61290322580645,1.87640449438202,0.843032295110456,1.36981914659638,1.03370786516854,1,0 +"chuck",1.0629400647,3.5097730621,-0.0355368923,"https://salsa.debian.org/debian/chuck","https://github.com/ccrma/chuck",4777.8660300926,19,55,0,45,92,0,1,108,3,"3",1.74324324324324,1.85185185185185,0.9602233295405,1.36082763487954,1.00925925925926,0,0 +"CiderWebmail",-0.6952594282,1.439044732,-1.4225189003,"https://salsa.debian.org/perl-team/modules/packages/ciderwebmail","https://github.com/CiderWebmail/CiderWebmail.git",5148.9571990741,1,13,0,5,11,0,0,12,4,"4",1.92857142857143,1.91666666666667,1.21548151104254,1.38443731048635,1,0,0 +"CiftiLib",-2.2337114106,-0.584429453,-2.6009802633,"https://salsa.debian.org/med-team/ciftilib","https://github.com/Washington-University/CiftiLib",3498.0756944445,2,7,0,5,8,0,0,8,2,"2",1.77777777777778,2,0.0799087839855137,1.4142135623731,1,0,0 +"CImg",-0.3086549748,0.4682516606,-0.6897965127,"https://salsa.debian.org/science-team/cimg","https://github.com/GreycLab/CImg.git",3104.3731481482,1,34,0,11,150,0,2,161,2,"2",1.97142857142857,1.93167701863354,-0.190902823566715,1.38984784010105,1.01242236024845,1,0 +"cinnamon-session",0.2019726211,0.7003204043,-0.0198993963,"https://salsa.debian.org/cinnamon-team/cinnamon-session","https://github.com/linuxmint/cinnamon-session.git",3830.8484259259,16,29,0,34,77,0,0,77,3,"3",1.64444444444444,2,0.308809305990776,1.4142135623731,1,1,0 +"citeproc-py",0.2650734109,3.200403032,-0.5379993649,"https://salsa.debian.org/python-team/packages/citeproc-py","https://github.com/brechtm/citeproc-py",4168.381087963,3,13,0,14,52,0,0,53,3,"3",1.8125,1.9811320754717,0.540983986260324,1.40752693596666,1,0,0 +"cJSON",-0.6378303304,1.1377366916,-1.0824295673,"https://salsa.debian.org/debian/cjson","https://github.com/DaveGamble/cJSON.git",4334.9435300926,37,63,0,76,105,0,0,162,3,"3",1.63,1.64814814814815,0.655555362887882,1.28380222314348,1,1,0 +"clasp",-0.3006037836,-0.1147250554,-0.3428180636,"https://salsa.debian.org/science-team/clasp","https://github.com/potassco/clasp",3296.9262847222,3,6,0,2,37,0,0,37,2,"2",1.66666666666667,2,-0.058453529180938,1.4142135623731,1,1,0 +"classified-ads",-2.2983699343,-0.0320591619,-2.7796278861,"https://github.com/operatornormal/classified-ads","https://github.com/operatornormal/classified-ads",3053.9196180556,5,9,0,8,10,0,0,12,2,"2",1.64285714285714,1.83333333333333,-0.225607708560725,1.35400640077266,1,1,0 +"cld2",0.6043981268,3.0399456446,-0.1481790802,"https://salsa.debian.org/debian/cld2","https://github.com/CLD2Owners/cld2",808.2021875,0,8,0,2,41,0,1,42,1,"1",2,1.97619047619048,-1.77034332990242,1.4057704208691,1.02380952380952,0,0 +"clinfo",0.3372645422,1.6891188178,-0.1400560842,"https://salsa.debian.org/opencl-team/clinfo","https://github.com/Oblomov/clinfo",3809.3789236111,7,13,0,14,92,0,0,93,3,"3",1.65,1.98924731182796,0.294041328262632,1.41040678948591,1,1,0 +"ClipIt",1.4937392865,3.438028355,0.6071495445,"https://salsa.debian.org/debian/clipit","https://github.com/CristianHenzel/ClipIt.git",3780.8276736111,15,24,0,21,246,0,0,247,3,"3",1.61538461538462,1.99595141700405,0.274402110830936,1.41278144700589,1,1,0 +"cloc",0.3407193618,2.1059135948,-0.1842658951,"https://salsa.debian.org/debian/cloc","https://github.com/AlDanial/cloc.git",3014.5104282408,24,101,0,108,550,0,2,569,2,"2",1.808,1.96660808435852,-0.252715651210516,1.40235804428061,1.00351493848858,1,0 +"cm-super",0.5096098115,1.5619464554,0.0498213871,"https://github.com/debian-tex/cm-super","https://github.com/debian-tex/cm-super",5018.3687962963,2,6,0,3,1,0,0,3,4,"4",1.75,1.33333333333333,1.1256551799288,1.15470053837925,1,0,0 +"cmatrix",1.2823687579,3.3153936495,0.3805014383,"https://salsa.debian.org/debian/cmatrix","https://github.com/abishekvashok/cmatrix.git",2359.866400463,20,18,0,32,137,0,2,148,1,"1",1.47368421052632,1.92567567567568,-0.703018051346753,1.3876871677996,1.01351351351351,1,1 +"colmap",-0.7206786583,0.6412726598,-1.2145608955,"https://salsa.debian.org/tar/colmap","https://github.com/colmap/colmap",2802.2067824074,103,16,0,103,432,0,0,503,2,"2",1.1344537815126,1.85884691848907,-0.398750499494357,1.36339536396786,1,1,1 +"comitup",-1.522007504,0.0892141487,-1.9480210845,"https://github.com/davesteele/comitup","https://github.com/davesteele/comitup",2830.0050115741,9,13,0,8,73,0,1,78,2,"2",1.59090909090909,1.93589743589744,-0.379629253775835,1.39136531360295,1.01282051282051,1,1 +"cool-retro-term",-0.1638065917,2.2338371828,-0.670026222,"https://salsa.debian.org/tar/cool-retro-term","https://github.com/Swordfish90/cool-retro-term",3050.8032175926,23,53,0,57,1087,0,26,1115,2,"2",1.69736842105263,1.97488789237668,-0.227751350828475,1.40530704558708,1.02331838565022,1,0 +"coq",1.0112440064,1.8992232667,0.4540481704,"https://salsa.debian.org/ocaml-team/coq","https://github.com/coq/coq",5785.2775347222,56,228,4,231,16,0,362,596,4,"4",1.80281690140845,1.02684563758389,1.65317980544307,1.01333392205328,1.60738255033557,0,1 +"CppAD",-0.3030038415,2.0775944536,-0.851490117,"https://salsa.debian.org/science-team/cppad","https://github.com/coin-or/CppAD",5756.9988773148,3,15,0,12,46,0,0,50,4,"4",1.83333333333333,1.92,1.63372809311873,1.3856406460551,1,0,0 +"cppo",-1.4562480515,0.6841532188,-1.9614183142,"https://salsa.debian.org/ocaml-team/cppo","https://github.com/mjambon/cppo.git",1459.7919444445,3,28,0,18,53,0,0,53,1,"1",1.90322580645161,2,-1.32214183564563,1.4142135623731,1,1,0 +"cppreference-doc-debian",0.7174863837,3.9751588838,-0.3114715055,"https://github.com/p12tic/cppreference-doc-debian","https://github.com/p12tic/cppreference-doc-debian",3405.6815740741,2,6,0,5,7,0,0,8,2,"2",1.75,1.875,0.016354711243878,1.36930639376292,1,1,0 +"CPU-X",-0.1831351513,2.2662774746,-0.7177695187,"https://salsa.debian.org/debian/cpu-x","https://github.com/X0rg/CPU-X.git",2770.4909606482,196,13,0,145,32,0,3,177,2,"2",1.0622009569378,1.18079096045198,-0.420566494225021,1.08664205718902,1.01694915254237,1,1 +"cqrlib",-0.1411361724,1.4544569834,-0.4267040837,"https://salsa.debian.org/science-team/cqrlib","https://github.com/yayahjb/cqrlib.git",2926.9641203704,0,1,0,1,3,0,0,3,2,"2",2,2,-0.312935115353383,1.4142135623731,1,0,0 +"critcl",0.1685050423,4.7425882465,-1.273547806,"https://salsa.debian.org/tcltk-team/critcl","https://github.com/andreas-kupries/critcl",5635.5840046296,1,15,2,12,40,0,0,43,4,"4",1.9375,1.93023255813953,1.55021185182959,1.38932809592966,1,1,0 +"CsoundQt",-0.414726718,0.4957472098,-0.6101873218,"https://salsa.debian.org/multimedia-team/csoundqt","https://github.com/CsoundQt/CsoundQt",5612.1172222222,7,49,3,16,87,0,7,97,4,"4",1.875,1.89690721649485,1.5340700281924,1.3772825478074,1.07216494845361,1,0 +"ctemplate",0.2254790855,1.2754696215,-0.1533076819,"https://salsa.debian.org/qt-kde-team/3rdparty/ctemplate","https://github.com/OlafvdSpek/ctemplate.git",5604.6906481482,3,11,0,8,43,0,0,44,4,"4",1.78571428571429,1.97727272727273,1.52896159675729,1.40615529984164,1,1,0 +"CubicSDR",0.1018461625,2.3388993412,-0.4986845369,"https://salsa.debian.org/debian-hamradio-team/cubicsdr","https://github.com/cjcliffe/CubicSDR.git",3287.5204976852,11,22,0,0,330,0,18,348,2,"2",1.66666666666667,1.94827586206897,-0.0649233788980561,1.3958065274489,1.05172413793103,1,0 +"custodia",-1.6751213621,-0.0779781476,-2.2266335422,"https://salsa.debian.org/freeipa-team/custodia","https://github.com/latchset/custodia.git",2105.2031134259,10,5,0,11,30,0,0,30,1,"1",1.33333333333333,2,-0.878190335081866,1.4142135623731,1,1,0 +"cvxopt",0.2544257296,0.9059783526,-0.0500804801,"https://salsa.debian.org/science-team/cvxopt","https://github.com/cvxopt/cvxopt",3827.9446875,7,5,0,7,228,0,0,228,3,"3",1.41666666666667,2,0.306811945093757,1.4142135623731,1,1,0 +"cyrus-sasl",1.1677078747,1.456798419,0.9287245609,"https://salsa.debian.org/debian/cyrus-sasl2","https://github.com/cyrusimap/cyrus-sasl.git",5510.1634606482,61,36,0,68,147,0,0,171,4,"4",1.37113402061856,1.85964912280702,1.46394027585122,1.36368952581114,1,1,1 +"dashel",-0.5070603207,1.8556035661,-1.0587894431,"https://salsa.debian.org/science-team/dashel.git","https://github.com/aseba-community/dashel.git",4686.2267708333,3,17,0,11,13,0,0,15,3,"3",1.85,1.86666666666667,0.897188494362601,1.36626010212795,1,0,0 +"dbab",-1.9903650996,-0.4617475154,-2.5099356053,"https://salsa.debian.org/debian/dbab","https://github.com/suntong/dbab.git",3490.7212037037,1,6,0,4,7,0,1,10,2,"2",1.85714285714286,1.7,0.0748499356773671,1.30384048104053,1.1,1,0 +"dcfldd",0.243299676,1.5128715597,-0.1742035117,"https://salsa.debian.org/debian/dcfldd","https://github.com/resurrecting-open-source-projects/dcfldd",1555.0382175926,1,5,0,4,11,0,0,11,1,"1",1.83333333333333,2,-1.25662588562893,1.4142135623731,1,0,1 +"dcmstack",-0.2179064003,2.3843724616,-1.1543074519,"https://salsa.debian.org/med-team/dcmstack","https://github.com/moloney/dcmstack.git",4236.057650463,2,11,0,8,50,0,0,51,3,"3",1.84615384615385,1.98039215686275,0.587535878943386,1.40726406792142,1,0,0 +"ddccontrol-db",0.5375899278,3.040666398,-0.2040495598,"https://salsa.debian.org/debian/ddccontrol-db","https://github.com/ddccontrol/ddccontrol-db",5706.4213541667,83,21,0,89,218,0,0,220,4,"4",1.20192307692308,1.99090909090909,1.5989379184587,1.41099577990478,1,0,0 +"ddclient",2.2300979217,3.0092386237,1.6657756531,"https://salsa.debian.org/debian/ddclient","https://github.com/ddclient/ddclient.git",5769.1157986111,45,69,0,89,144,0,7,199,4,"4",1.60526315789474,1.72361809045226,1.64206281933705,1.3128663642779,1.03517587939698,0,1 +"debiman",-2.0205023232,-0.3691368262,-2.3529854163,"https://salsa.debian.org/go-team/packages/debiman","https://github.com/Debian/debiman.git",2469.6214583333,11,3,0,12,58,0,0,61,1,"1",1.21428571428571,1.95081967213115,-0.627522111738391,1.39671746324414,1,1,0 +"deepdiff",-0.60032076,1.9943773022,-1.1853796171,"https://salsa.debian.org/python-team/packages/deepdiff","https://github.com/seperman/deepdiff.git",3349.8121875,21,67,0,59,387,0,0,390,2,"2",1.76136363636364,1.99230769230769,-0.022075516178888,1.41149130082608,1,1,0 +"dehydrated-hook-ddns-tsig",-1.1498688177,0.3234067787,-1.4723938378,"https://salsa.debian.org/letsencrypt-team/dehydrated-hook-ddns-tsig","https://github.com/eferdman/dehydrated-hook-ddns-tsig.git",613.6095601852,3,7,0,5,13,0,0,13,1,"1",1.7,2,-1.9041955051466,1.4142135623731,1,1,0 +"deken",-0.1773993382,1.8798950337,-0.6127948533,"https://salsa.debian.org/multimedia-team/pd/deken","https://github.com/pure-data/deken",3169.7776041667,5,17,1,9,50,0,0,50,2,"2",1.77272727272727,2,-0.145913818435621,1.4142135623731,1,1,0 +"derpconf",-2.1632661335,-0.2479529966,-2.7160545081,"https://salsa.debian.org/python-team/packages/derpconf","https://github.com/globocom/derpconf",4088.1859490741,0,19,0,10,21,0,0,23,3,"3",2,1.91304347826087,0.485821085525533,1.38312814961625,1,1,0 +"detachtty",0.7286668661,3.7996202071,-0.4663424257,"https://salsa.debian.org/debian/detachtty","https://github.com/cosmos72/detachtty.git",5063.0382175926,2,3,0,4,4,0,0,5,4,"4",1.6,1.8,1.15638141704227,1.34164078649987,1,0,0 +"detox",0.0760137719,1.2444609771,-0.236573077,"https://salsa.debian.org/debian/detox","https://github.com/dharple/detox",2472.5849305556,3,6,0,5,44,0,0,44,1,"1",1.66666666666667,2,-0.62548366244715,1.4142135623731,1,1,0 +"devtodo",-0.0964373601,0.5231337283,-0.4667575617,"https://salsa.debian.org/debian/devtodo","https://github.com/alecthomas/devtodo",4517.7004398148,2,2,0,1,5,0,0,5,3,"3",1.5,2,0.781266240246288,1.4142135623731,1,0,0 +"dfc",0.6249482733,2.6923246378,-0.1060154397,"https://salsa.debian.org/debian/dfc","https://github.com/rolinh/dfc",3944.7026157408,10,7,0,15,23,0,0,28,3,"3",1.41176470588235,1.82142857142857,0.387124867981388,1.34960311626366,1,1,0 +"dhcpcd-dbus",0.116885126,3.4089949811,-0.7932984933,"https://salsa.debian.org/debian/dhcpcd-dbus","https://github.com/kobolabs/dhcpcd-dbus.git",4098.2566550926,2,6,0,3,0,0,0,3,3,"3",1.75,1,0.492748305356119,1,1,0,0 +"dhcpcd-ui",-0.0122872414,2.5695283858,-0.8367345755,"https://salsa.debian.org/debian/dhcpcd-ui","https://github.com/NetworkConfiguration/dhcpcd-ui",5203.8271875,4,2,0,5,0,0,0,5,4,"4",1.33333333333333,1,1.25322429404402,1,1,0,0 +"dhcpcd",0.6815852227,1.5374108,0.1969854249,"https://salsa.debian.org/debian/dhcpcd","https://github.com/NetworkConfiguration/dhcpcd.git",5784.3856944445,64,17,0,56,18,0,0,59,4,"4",1.20987654320988,1.30508474576271,1.65256634560758,1.14240305749009,1,1,0 +"dhcpdump",1.4490750412,4.1456331911,0.3872406438,"https://github.com/bbonev/dhcpdump","https://github.com/bbonev/dhcpdump",112.9948032407,0,3,0,2,3,0,0,3,1,"1",2,2,-2.24854757593681,1.4142135623731,1,1,0 +"DHCPig",-0.9872435316,1.3324162128,-1.5205038766,"https://salsa.debian.org/pkg-security-team/dhcpig","https://github.com/kamorin/DHCPig",1930.9329398148,0,7,0,7,22,0,0,24,1,"1",2,1.91666666666667,-0.998063539631855,1.38443731048635,1,1,0 +"dhewm3",-0.2903203144,1.9161738096,-0.7863581959,"https://salsa.debian.org/games-team/dhewm3","https://github.com/dhewm/dhewm3.git",4378.332974537,36,21,0,41,120,0,7,144,3,"3",1.36842105263158,1.83333333333333,0.685401157159029,1.35400640077266,1.04861111111111,1,0 +"diffuse",0.6569991928,3.1825265926,-0.1258422859,"https://salsa.debian.org/debian/diffuse","https://github.com/MightyCreak/diffuse.git",2779.0936226852,15,12,0,21,61,0,0,61,2,"2",1.44444444444444,2,-0.414649080793523,1.4142135623731,1,1,0 +"dill",-0.0692957122,2.3594211277,-0.5014890362,"https://salsa.debian.org/python-team/packages/dill","https://github.com/uqfoundation/dill",5216.8620486111,22,27,2,41,513,0,0,513,4,"4",1.55102040816327,2,1.26219043288392,1.4142135623731,1,0,0 +"direwolf",-0.1430216901,1.3707430635,-0.6200279656,"https://salsa.debian.org/debian-hamradio-team/direwolf","https://github.com/wb2osz/direwolf",2351.9412615741,7,18,1,0,251,0,1,252,1,"1",1.72,1.99603174603175,-0.708469424782785,1.41280987610922,1.00396825396825,0,0 +"django-auth-ldap",-0.7351113605,0.589742959,-1.162005947,"https://salsa.debian.org/python-team/packages/django-auth-ldap","https://github.com/django-auth-ldap/django-auth-ldap.git",5095.4516550926,18,22,0,24,215,0,0,223,4,"4",1.55,1.96412556053812,1.17867727262727,1.40147263995346,1,0,0 +"django-classy-tags",-0.7401841635,0.9848619547,-1.3980531867,"https://salsa.debian.org/python-team/packages/django-classy-tags","https://github.com/django-cms/django-classy-tags",4877.1677893519,15,16,2,22,70,0,0,70,3,"3",1.51612903225806,2,1.02852887978588,1.4142135623731,1,0,0 +"django-countries",-0.5347084486,1.3547470964,-1.2788572175,"https://salsa.debian.org/python-team/packages/django-countries","https://github.com/SmileyChris/django-countries",4972.680625,16,45,0,50,303,0,0,314,3,"3",1.73770491803279,1.96496815286624,1.09422818706002,1.40177321734517,1,0,0 +"django-fsm",-1.2455924049,1.7684823777,-1.9508426508,"https://salsa.debian.org/python-team/packages/django-fsm","https://github.com/viewflow/django-fsm",4622.1760763889,28,45,0,58,257,0,0,258,3,"3",1.61643835616438,1.99612403100775,0.853130685515537,1.41284253581486,1,0,0 +"django-haystack",-0.3668845966,1.4515254842,-0.931809609,"https://salsa.debian.org/python-team/packages/django-haystack","https://github.com/django-haystack/django-haystack",5440.2651388889,100,135,5,183,156,0,0,323,4,"4",1.57446808510638,1.48297213622291,1.41586012737641,1.21777343386318,1,0,1 +"pkg-django-hijack",-2.1622270176,0.0257030995,-2.8657585957,"https://github.com/Linaro/pkg-django-hijack.git","https://github.com/Linaro/pkg-django-hijack.git",1013.9897106482,0,2,0,1,0,0,0,1,1,"1",2,1,-1.62879065140891,1,1,0,0 +"django-housekeeping",-0.869454572,1.948090224,-1.6153462575,"https://salsa.debian.org/python-team/packages/django-housekeeping","https://github.com/spanezz/django-housekeeping.git",2311.2066087963,0,4,0,3,4,0,0,5,1,"1",2,1.8,-0.736489098278967,1.34164078649987,1,1,0 +"django-ipware",-0.186701027,3.4775277787,-1.1364140371,"https://salsa.debian.org/python-team/packages/django-ipware","https://github.com/un33k/django-ipware",3876.7555324074,23,8,0,26,86,0,1,87,3,"3",1.25806451612903,1.98850574712644,0.340386895267961,1.41014387461934,1.01149425287356,1,1 +"django-modeltranslation",-1.5133383269,0.6332844289,-2.2136337591,"https://salsa.debian.org/python-team/packages/django-modeltranslation","https://github.com/deschler/django-modeltranslation.git",5393.628900463,39,78,0,93,559,0,1,562,4,"4",1.66666666666667,1.99466192170819,1.38378099855919,1.41232500569387,1.0017793594306,0,0 +"django-polymorphic",-0.9862725279,0.7261077657,-1.6214857875,"https://salsa.debian.org/python-team/packages/django-polymorphic","https://github.com/django-polymorphic/django-polymorphic",5078.6096990741,41,80,1,100,253,0,0,305,4,"4",1.66115702479339,1.82950819672131,1.16709239153722,1.35259313791003,1,0,0 +"django-prometheus",-2.2603160573,-0.4381341974,-2.7422527304,"https://salsa.debian.org/python-team/packages/django-prometheus","https://github.com/korfuri/django-prometheus",3173.3548148148,32,30,0,50,294,0,0,294,2,"2",1.48387096774194,2,-0.143453204006585,1.4142135623731,1,1,1 +"django-python3-ldap",-1.220695241,0.9816108419,-1.7104148484,"https://salsa.debian.org/python-team/packages/django-python3-ldap","https://github.com/etianen/django-python3-ldap",3090.7084259259,4,28,0,25,204,0,0,208,2,"2",1.875,1.98076923076923,-0.200302217669162,1.40739803565631,1,0,0 +"django-sitetree",-1.1970109861,0.3805270522,-1.67880198,"https://salsa.debian.org/python-team/packages/django-sitetree","https://github.com/idlesign/django-sitetree",4549.666712963,6,42,0,36,185,0,0,185,3,"3",1.875,2,0.803254510071199,1.4142135623731,1,0,0 +"django-sortedm2m",-2.3457198242,-0.0825384392,-2.7865717155,"https://salsa.debian.org/python-team/packages/django-sortedm2m","https://github.com/jazzband/django-sortedm2m.git",4988.0868287037,13,51,0,48,177,0,0,178,4,"4",1.796875,1.99438202247191,1.1048254738455,1.41222591056527,1,0,1 +"dma",0.9255897857,2.1311120692,0.2618365609,"https://salsa.debian.org/debian/dma","https://github.com/corecode/dma.git",4350.2836574074,26,18,0,30,98,0,0,99,3,"3",1.40909090909091,1.98989898989899,0.666107198473548,1.4106377954312,1,0,0 +"dmrconfig",-4.4180298219,-0.9106394342,-5.3737002754,"https://salsa.debian.org/debian-hamradio-team/dmrconfig","https://github.com/OpenRTX/dmrconfig.git",1907.596412037,5,9,0,11,74,0,2,76,1,"1",1.64285714285714,1.97368421052632,-1.01411576652662,1.40487871737254,1.02631578947368,1,0 +"dnspython",1.1275058498,2.6742605707,0.4158531709,"https://salsa.debian.org/python-team/packages/dnspython","https://github.com/rthalley/dnspython.git",5665.3041087963,41,93,0,107,427,0,2,460,4,"4",1.69402985074627,1.92826086956522,1.57065507543005,1.38861833113538,1.00434782608696,1,0 +"dnsruby",-0.234176424,1.5390828902,-0.6784148131,"https://salsa.debian.org/ruby-team/ruby-dnsruby","https://github.com/alexdalitz/dnsruby.git",5594.1314467593,4,31,0,23,77,0,3,82,4,"4",1.88571428571429,1.9390243902439,1.52169836127787,1.39248856018421,1.03658536585366,1,0 +"Doris",-3.2514630416,-2.7560514844,-3.3329815998,"https://salsa.debian.org/debian-gis-team/doris","https://github.com/TUDelftGeodesy/Doris",371.9438888889,0,6,0,3,31,0,0,33,1,"1",2,1.93939393939394,-2.07042726958301,1.39262124764558,1,0,0 +"dosage",-0.7866623156,0.1614581475,-1.1313932158,"https://salsa.debian.org/debian/dosage","https://github.com/webcomics/dosage",4186.6960185185,22,40,1,51,112,0,0,122,3,"3",1.64516129032258,1.91803278688525,0.553582065273533,1.38493060724545,1,1,0 +"dosfstools",0.9576699829,1.4464254542,0.6170237773,"https://salsa.debian.org/debian/dosfstools","https://github.com/dosfstools/dosfstools.git",3911.4083101852,49,15,0,39,137,0,0,155,3,"3",1.234375,1.88387096774194,0.364223099896146,1.37254179089088,1,1,0 +"dpmb",-0.6691898306,1.5148767963,-1.1659559787,"https://github.com/dpmb/dpmb","https://github.com/dpmb/dpmb",3025.1458101852,5,11,1,7,14,0,0,15,2,"2",1.6875,1.93333333333333,-0.245400014295312,1.39044357430761,1,0,1 +"dq",-0.1834293154,2.1580450192,-0.7499592676,"https://salsa.debian.org/debian/dq","https://github.com/janmojzis/dq.git",2922.0256712963,0,7,0,1,3,0,0,3,2,"2",2,2,-0.31633206908191,1.4142135623731,1,1,0 +"drf-extensions",-1.5711074271,0.582669346,-2.2334265763,"https://salsa.debian.org/python-team/packages/drf-extensions","https://github.com/chibisov/drf-extensions.git",3758.3081018519,37,33,0,52,293,0,0,293,2,"2",1.47142857142857,2,0.25891183400426,1.4142135623731,1,1,0 +"drf-generators",-1.0791841561,1.9108535938,-1.8015507649,"https://salsa.debian.org/python-team/packages/drf-generators","https://github.com/brobin/drf-generators",1981.457962963,4,10,0,9,39,0,0,39,1,"1",1.71428571428571,2,-0.963309477538287,1.4142135623731,1,0,0 +"driftnet",-0.3021441377,0.4582796981,-0.6160981524,"https://github.com/deiv/driftnet","https://github.com/deiv/driftnet",3936.0659722222,4,6,0,5,58,0,0,58,3,"3",1.6,2,0.381184080101984,1.4142135623731,1,1,0 +"drmaa-python",-0.9229869282,0.8943517279,-1.5388923357,"https://salsa.debian.org/med-team/drmaa","https://github.com/pygridtools/drmaa-python",3564.105462963,9,12,0,13,58,0,4,63,2,"2",1.57142857142857,1.92063492063492,0.12532791557868,1.38586973436717,1.06349206349206,0,0 +"drmips",-0.9190476493,1.6685906624,-1.6412123268,"https://github.com/brunonova/drmips/tree/debian","https://github.com/brunonova/drmips",3165.66125,3,3,0,4,0,0,0,4,2,"2",1.5,1,-0.148745287268183,1,1,1,1 +"dropbear",0.4812175514,0.9754576643,0.1540354658,"https://salsa.debian.org/debian/dropbear","https://github.com/mkj/dropbear",5772.037037037,39,54,0,67,213,0,0,225,4,"4",1.58064516129032,1.94666666666667,1.64407221775624,1.39522996909709,1,0,0 +"dropwatch",-1.1991262604,1.5250708737,-1.8285406941,"https://salsa.debian.org/debian/dropwatch","https://github.com/nhorman/dropwatch",5326.1496296296,3,24,0,17,70,0,0,72,4,"4",1.88888888888889,1.97222222222222,1.33736481460824,1.40435829552939,1,1,0 +"dunst",0.3669983163,1.1637822615,0.0070676604,"https://salsa.debian.org/debian/dunst","https://github.com/dunst-project/dunst",4447.0045601852,43,111,1,126,562,0,26,653,3,"3",1.72077922077922,1.86064318529862,0.732637484882836,1.36405395248818,1.03981623277182,1,0 +"DustRacing2D",0.1730330143,3.1219082568,-0.6411485316,"https://salsa.debian.org/pino/dustrac","https://github.com/juzzlin/DustRacing2D.git",4428.4226851852,8,9,0,11,36,0,1,37,3,"3",1.52941176470588,1.97297297297297,0.719855785888446,1.40462556326338,1.02702702702703,1,0 +"e2guardian",-0.4962046033,0.8559279449,-0.8848150366,"https://salsa.debian.org/debian-edu-pkg-team/e2guardian","https://github.com/e2guardian/e2guardian",3743.8510416667,10,60,4,20,68,0,4,84,2,"2",1.85714285714286,1.80952380952381,0.248967423570382,1.3451854182691,1.04761904761905,1,0 +"editorconfig-core-c",1.5887281662,4.6075180153,0.4803432984,"https://salsa.debian.org/debian/editorconfig-core","https://github.com/editorconfig/editorconfig-core-c.git",4345.1404861111,23,19,0,32,52,0,2,54,3,"3",1.45238095238095,1.96296296296296,0.662569424842744,1.40105780143539,1.03703703703704,1,0 +"editra",-0.2633359349,1.1859959258,-0.7394398489,"https://github.com/mogaal/editra","https://github.com/mogaal/editra",1762.9254398148,0,2,0,1,2,0,0,3,1,"1",2,1.66666666666667,-1.11362891146867,1.29099444873581,1,0,0 +"efivar",1.2395472847,3.1409084649,0.4366490781,"https://salsa.debian.org/efi-team/efivar","https://github.com/rhinstaller/efivar.git",3854.9068634259,62,9,0,62,181,0,0,184,3,"3",1.12676056338028,1.98369565217391,0.325358104559293,1.40843730857071,1,1,0 +"eggdrop-debian",0.690268777,1.6966766009,0.0747126473,"https://github.com/yastupin/eggdrop-debian","https://github.com/yastupin/eggdrop-debian",1023.9554166667,0,1,0,1,2,0,0,2,1,"1",2,2,-1.62193565671139,1.4142135623731,1,0,0 +"egl-wayland",0.0316178932,1.8159648449,-0.3538526989,"https://salsa.debian.org/debian/egl-wayland","https://github.com/NVIDIA/egl-wayland.git",2464.5272800926,13,9,0,14,170,0,0,172,1,"1",1.40909090909091,1.98837209302326,-0.631026185083864,1.41009648358659,1,1,0 +"eiciel",-0.3913934912,0.2845531206,-0.6225036497,"https://salsa.debian.org/debian/eiciel","https://github.com/rofirrim/eiciel",4391.8161689815,58,10,0,42,13,0,0,46,3,"3",1.14705882352941,1.28260869565217,0.694675685852847,1.13252315457662,1,1,0 +"eiskaltdcpp-debian",0.4505650107,2.0973490193,-0.2886793088,"https://github.com/eiskaltdcpp/eiskaltdcpp-debian","https://github.com/eiskaltdcpp/eiskaltdcpp-debian",3513.9242361111,0,2,0,2,3,0,0,3,2,"2",2,2,0.0908103366588872,1.4142135623731,1,0,0 +"eja",-2.7925237394,1.0154047624,-3.9912920842,"https://github.com/ubaldus/eja","https://github.com/ubaldus/eja",3036.7696296296,0,5,0,3,3,0,0,4,2,"2",2,1.75,-0.237404472332864,1.3228756555323,1,0,0 +"elastalert",-2.7490522153,-1.0382477163,-3.253107753,"https://salsa.debian.org/debian/elastalert","https://github.com/Yelp/elastalert.git",2822.0809490741,46,241,0,181,234,0,4,371,2,"2",1.8397212543554,1.63072776280323,-0.38507988680871,1.27699951558457,1.01078167115903,1,0 +"emacs-git-messenger",-0.7394110957,1.3440255665,-1.1759453412,"https://salsa.debian.org/emacsen-team/emacs-git-messenger","https://github.com/syohex/emacs-git-messenger.git",3062.6,2,8,0,7,23,0,0,23,2,"2",1.8,2,-0.219636834837289,1.4142135623731,1,1,0 +"git-modes",-0.5095691095,1.8818747091,-0.9450708252,"https://salsa.debian.org/emacsen-team/emacs-git-modes","https://github.com/magit/git-modes.git",4898.4598032408,8,34,0,39,64,0,0,75,3,"3",1.80952380952381,1.85333333333333,1.04317477060757,1.36137185711081,1,0,0 +"emacs-jedi",-0.5925564326,1.6685968963,-1.0626804159,"https://salsa.debian.org/emacsen-team/emacs-jedi","https://github.com/tkf/emacs-jedi.git",3462.8411458333,5,28,0,30,288,0,2,290,2,"2",1.84848484848485,1.99310344827586,0.0556724033968164,1.41177315751358,1.00689655172414,0,1 +"emacspeak",-0.3098123339,0.154967146,-0.6063949443,"https://salsa.debian.org/a11y-team/emacspeak","https://github.com/tvraman/emacspeak.git",5784.5154976852,1,16,0,7,53,0,0,53,4,"4",1.94117647058824,2,1.65265563185835,1.4142135623731,1,0,0 +"enchant",0.4671232701,2.6138489169,-0.0641062097,"https://salsa.debian.org/gnome-team/enchant-2/","https://github.com/AbiWord/enchant.git",5773.2183333333,7,27,0,26,105,0,1,112,4,"4",1.79411764705882,1.9375,1.64488478234848,1.39194109070751,1.00892857142857,0,0 +"engrampa",0.3364707225,1.2009801373,-0.0018104828,"https://salsa.debian.org/debian-mate-team/engrampa","https://github.com/mate-desktop/engrampa.git",4345.1016319445,27,39,0,38,189,0,0,191,3,"3",1.59090909090909,1.98952879581152,0.66254269867748,1.41050657418231,1,0,0 +"erlware_commons",-1.8744095819,0.8786023846,-2.6652549432,"https://salsa.debian.org/erlang-team/packages/erlang-erlware-commons","https://github.com/erlware/erlware_commons.git",4657.9532060185,8,37,0,28,72,0,0,72,3,"3",1.82222222222222,2,0.877740285020908,1.4142135623731,1,1,1 +"folsom",-1.800386042,0.5181389354,-2.3318647887,"https://salsa.debian.org/erlang-team/packages/erlang-folsom","https://github.com/boundary/folsom.git",1470.0027777778,3,37,0,30,72,0,0,75,1,"1",1.925,1.96,-1.31511822806307,1.4,1,1,0 +"jiffy",0.1668501203,2.4255381931,-0.3758394191,"https://salsa.debian.org/erlang-team/packages/erlang-jiffy","https://github.com/davisp/jiffy.git",3978.8049884259,23,14,0,27,227,0,0,227,3,"3",1.37837837837838,2,0.410582471837591,1.4142135623731,1,1,0 +"erlang-jose",-0.0923635531,2.3327857993,-0.5705493125,"https://salsa.debian.org/ejabberd-packaging-team/erlang-jose","https://github.com/potatosalad/erlang-jose.git",3054.6266782407,10,30,0,29,125,0,0,125,2,"2",1.75,2,-0.225121351265949,1.4142135623731,1,1,0 +"lager",0.1330257958,2.1705993041,-0.3821435959,"https://salsa.debian.org/ejabberd-packaging-team/erlang-lager","https://github.com/erlang-lager/lager.git",4513.8316435185,17,130,0,101,372,0,1,377,3,"3",1.8843537414966,1.9867374005305,0.77860505617687,1.40951672587824,1.0026525198939,1,0 +"meck",-1.7847622485,-0.6288022984,-2.0590391976,"https://salsa.debian.org/erlang-team/packages/erlang-meck","https://github.com/eproxus/meck.git",4901.9858333333,34,45,0,52,158,0,9,176,3,"3",1.56962025316456,1.89772727272727,1.045600180061,1.37758022369925,1.05113636363636,1,1 +"fast_tls",-0.157152573,1.1095215195,-0.4106607165,"https://salsa.debian.org/ejabberd-packaging-team/erlang-p1-tls","https://github.com/processone/fast_tls.git",3904.2279282408,5,26,0,18,52,0,0,56,3,"3",1.83870967741935,1.92857142857143,0.359284013787877,1.38873014965883,1,1,1 +"eredis",-0.9857886966,1.2120613864,-1.431244437,"https://salsa.debian.org/ejabberd-packaging-team/erlang-redis-client","https://github.com/wooga/eredis.git",2851.9773842593,2,48,0,34,122,0,0,123,2,"2",1.96,1.99186991869919,-0.364515372434216,1.41133621745465,1,0,0 +"eshell-git-prompt",-0.9609411721,1.6959194934,-1.5424020682,"https://salsa.debian.org/emacsen-team/eshell-git-prompt","https://github.com/xuchunyang/eshell-git-prompt.git",2545.7433564815,1,11,0,6,11,0,0,11,1,"1",1.91666666666667,2,-0.575161023903499,1.4142135623731,1,0,0 +"espeakup",-0.5060781696,0.017914626,-0.7493763311,"https://salsa.debian.org/a11y-team/espeakup","https://github.com/williamh/espeakup",4725.7581134259,2,6,0,4,0,0,0,4,3,"3",1.75,1,0.92438046082792,1,1,1,0 +"ettercap",0.3516997318,0.9604770242,0.005454292,"https://salsa.debian.org/pkg-security-team/ettercap","https://github.com/Ettercap/ettercap.git",4364.9420717593,13,80,0,48,36,0,12,84,3,"3",1.86021505376344,1.42857142857143,0.676190112064402,1.19522860933439,1.14285714285714,0,0 +"evilwm",0.1058350749,1.7709141502,-0.5887613795,"https://github.com/mati75/evilwm.git","https://github.com/mati75/evilwm.git",3558.3624189815,0,7,0,4,4,0,0,5,2,"2",2,1.8,0.121377514476365,1.34164078649987,1,0,0 +"evqueue-core",-3.8008904307,0.0055401804,-5.0310894983,"https://github.com/coldsource/evqueue-core","https://github.com/coldsource/evqueue-core",3176.9503935185,0,23,0,4,7,0,1,9,2,"2",2,1.77777777777778,-0.140979954956027,1.33333333333333,1.11111111111111,1,0 +"exabgp",-0.5661496323,0.4143666278,-0.9529715,"https://github.com/Exa-Networks/exabgp/tree/debian/sid","https://github.com/Exa-Networks/exabgp",5211.7322222222,28,135,5,103,93,0,40,211,4,"4",1.82822085889571,1.44075829383886,1.2586618386599,1.20031591418212,1.18957345971564,1,1 +"f3",0.2679415625,2.6534869606,-0.2923376765,"https://salsa.debian.org/debian/f3","https://github.com/AltraMayor/f3.git",4281.9233912037,11,29,0,36,202,0,0,206,3,"3",1.725,1.98058252427184,0.619085014447871,1.40733170371162,1,0,0 +"fabric",0.2361201884,1.1224452265,-0.2395604756,"https://salsa.debian.org/python-team/packages/fabric","https://github.com/fabric/fabric.git",5703.0252199074,79,121,0,17,660,0,0,672,4,"4",1.605,1.98214285714286,1.59660185894657,1.40788595317336,1,0,0 +"fastkml",-1.1512391887,1.6385429324,-1.936594667,"https://salsa.debian.org/python-team/packages/fastkml","https://github.com/cleder/fastkml",4190.9523148148,13,36,2,36,109,0,0,110,3,"3",1.73469387755102,1.99090909090909,0.556509794476869,1.41099577990478,1,0,0 +"fceux",3.1366942055,8.4703461382,1.4758017291,"https://salsa.debian.org/games-team/fceux","https://github.com/TASEmulators/fceux.git",5697.8923611111,20,74,0,39,179,0,0,185,4,"4",1.78723404255319,1.96756756756757,1.59307117885562,1.40270009894046,1,0,0 +"fence-agents",-0.0526755775,0.7306960785,-0.3413654082,"https://salsa.debian.org/ha-team/fence-agents","https://github.com/ClusterLabs/fence-agents",5742.9759722222,67,106,0,112,160,0,0,195,4,"4",1.61271676300578,1.82051282051282,1.62408231991658,1.34926380686388,1,0,0 +"pkg-ferm",1.1755791706,1.9154949013,0.6944760141,"https://github.com/formorer/pkg-ferm","https://github.com/formorer/pkg-ferm",1766.1921643519,3,2,0,3,7,0,0,9,1,"1",1.4,1.77777777777778,-1.1113818675223,1.33333333333333,1,0,0 +"ffindex",-0.3841947458,0.7848746806,-0.7256317717,"https://salsa.debian.org/med-team/ffindex","https://github.com/ahcm/ffindex.git",4107.5377777778,1,9,0,2,4,0,1,6,3,"3",1.9,1.66666666666667,0.49913240365041,1.29099444873581,1.16666666666667,1,0 +"ffmpegthumbnailer",0.6218339,1.7026039531,0.1299334729,"https://salsa.debian.org/multimedia-team/ffmpegthumbnailer","https://github.com/dirkvdb/ffmpegthumbnailer",5750.9852893519,2,26,0,21,32,0,0,49,4,"4",1.92857142857143,1.6530612244898,1.6295915960635,1.28571428571429,1,1,0 +"fftw3",0.5606957848,1.057025995,0.2642840796,"https://salsa.debian.org/science-team/fftw3","https://github.com/FFTW/fftw3.git",5716.0486458333,17,23,0,31,333,0,2,338,4,"4",1.575,1.98520710059172,1.60556013199816,1.4089737756934,1.00591715976331,1,0 +"FileTea",-1.4880291168,-0.5976104943,-1.6869426547,"https://salsa.debian.org/berto/filetea","https://github.com/elima/FileTea",2414.4586111111,4,1,0,2,17,0,0,18,1,"1",1.2,1.94444444444444,-0.665466340125878,1.39443337755679,1,0,0 +"filtergen",-1.4900593021,-0.2527170414,-2.0161816495,"https://github.com/jaqx0r/filtergen/tree/debian","https://github.com/jaqx0r/filtergen",4988.9503125,3,6,0,2,5,0,0,5,4,"4",1.66666666666667,2,1.10541942843678,1.4142135623731,1,1,0 +"findimagedupes",0.1571397257,1.014130714,-0.2428383842,"https://salsa.debian.org/science-team/findimagedupes","https://github.com/jhnc/findimagedupes.git",5609.2984837963,0,1,0,0,16,0,0,16,4,"4",2,2,1.53213113526024,1.4142135623731,1,1,0 +"Fiona",-0.4518295489,0.0316996689,-0.548290247,"https://salsa.debian.org/debian-gis-team/fiona","https://github.com/Toblerity/Fiona.git",2732.0256712963,42,33,0,64,34,0,1,91,1,"1",1.44,1.37362637362637,-0.447025167003098,1.17201807734624,1.01098901098901,0,0 +"firehol",0.2337473723,0.6567606394,-0.0568826659,"https://salsa.debian.org/debian/firehol","https://github.com/firehol/firehol",5475.3480324074,8,33,1,24,278,0,16,297,4,"4",1.80487804878049,1.93602693602694,1.43999219073416,1.39141184989454,1.05387205387205,0,0 +"flask-mongoengine",-1.2847143273,1.6755709624,-2.0678485801,"https://salsa.debian.org/python-team/packages/flask-mongoengine","https://github.com/mongoengine/flask-mongoengine",4513.2838078704,18,81,5,71,356,0,0,361,3,"3",1.81818181818182,1.98614958448753,0.778228222818966,1.40930819357851,1,1,1 +"flask-openid",0.228453383,2.6597609885,-0.3213084888,"https://salsa.debian.org/python-team/packages/flask-openid","https://github.com/mitsuhiko/flask-openid.git",4219.2356481482,6,12,0,12,96,0,0,97,3,"3",1.66666666666667,1.98969072164948,0.575964723176236,1.41056397290215,1,0,0 +"flask-restful",0.34791132,1.6712629803,-0.0854278525,"https://salsa.debian.org/python-team/packages/flask-restful","https://github.com/flask-restful/flask-restful",3867.9860763889,52,124,0,135,573,0,0,611,3,"3",1.70454545454545,1.93780687397709,0.334354751193533,1.3920513187297,1,1,1 +"flatbuffers",-1.160445057,0.9112660212,-1.581988532,"https://salsa.debian.org/debian/flatbuffers","https://github.com/google/flatbuffers.git",3592.7395138889,597,121,0,431,19,0,6,452,2,"2",1.16852367688022,1.04203539823009,0.145024088323622,1.02080135101306,1.01327433628319,0,1 +"flim",0.7666961285,1.9591073504,0.1611787583,"https://salsa.debian.org/debian/flim","https://github.com/wanderlust/flim",5370.129212963,4,13,0,8,10,0,0,12,4,"4",1.76470588235294,1.83333333333333,1.36761654087732,1.35400640077266,1,0,0 +"arb",0.2828492531,2.1064015572,-0.2652901459,"https://salsa.debian.org/math-team/flint-arb","https://github.com/fredrik-johansson/arb",4241.2918865741,4,42,0,34,106,0,1,108,3,"3",1.91304347826087,1.98148148148148,0.591136292272916,1.40765105103555,1.00925925925926,0,0 +"FlintQS",0.8705325607,4.2184408876,-0.1229863815,"https://salsa.debian.org/science-team/flintqs","https://github.com/sagemath/FlintQS",2671.3606365741,0,2,0,2,2,0,0,3,1,"1",2,1.66666666666667,-0.48875412133647,1.29099444873581,1,0,0 +"flite",0.3744081413,0.8157223595,0.1404183728,"https://salsa.debian.org/a11y-team/flite","https://github.com/festvox/flite.git",1668.0555208333,9,16,0,21,106,0,0,106,1,"1",1.64,2,-1.17888598310669,1.4142135623731,1,1,0 +"fmit",1.0288892251,2.9965682542,0.1345537728,"https://salsa.debian.org/debian/fmit","https://github.com/gillesdegottex/fmit.git",2966.0915162037,22,10,0,21,45,0,0,56,2,"2",1.3125,1.80357142857143,-0.286021007063685,1.34297111978308,1,0,0 +"fntsample",-1.2332590184,-0.5969756101,-1.356176006,"https://salsa.debian.org/debian/fntsample","https://github.com/eugmes/fntsample.git",4121.0789467593,2,4,0,4,10,0,0,10,3,"3",1.66666666666667,2,0.508446810617076,1.4142135623731,1,0,0 +"master",0.5018954955,1.5987261482,0.0085779359,"https://salsa.debian.org/fonts-team/font-manager","https://github.com/FontManager/master",5185.326875,55,11,1,48,170,0,0,191,4,"4",1.16666666666667,1.89005235602094,1.2404986985012,1.3747917500556,1,0,0 +"Hack",0.3465705045,2.2081920487,-0.0730912243,"https://salsa.debian.org/fonts-team/fonts-hack","https://github.com/source-foundry/Hack",1976.7616666667,7,26,5,23,227,0,0,243,1,"1",1.78787878787879,1.93415637860082,-0.966539864442072,1.39073950781619,1,0,0 +"amiri",0.0448942076,0.9201808842,-0.1302579721,"https://salsa.debian.org/fonts-team/fonts-hosny-amiri","https://github.com/alif-type/amiri.git",5474.3578935185,5,10,0,8,97,0,0,98,4,"4",1.66666666666667,1.98979591836735,1.43931111537225,1.41060126129511,1,1,0 +"inter",0.0129835005,2.785802699,-0.6565554603,"https://salsa.debian.org/fonts-team/fonts-inter","https://github.com/rsms/inter",2281.2912847222,23,7,3,20,124,0,0,141,1,"1",1.23333333333333,1.87943262411348,-0.757066605534548,1.37092400377026,1,0,0 +"frogatto",0.2316946335,1.7654688811,-0.3927779946,"https://salsa.debian.org/games-team/frogatto","https://github.com/frogatto/frogatto.git",5646.0325115741,6,89,0,29,83,0,17,104,4,"4",1.93684210526316,1.79807692307692,1.55739894520447,1.34092390652002,1.16346153846154,1,0 +"Frozen-Flask",-1.5052476806,0.5681861838,-1.9677533136,"https://github.com/SimonSapin/Frozen-Flask/","https://github.com/SimonSapin/Frozen-Flask",4711.306712963,2,29,0,26,105,0,1,106,3,"3",1.93548387096774,1.99056603773585,0.914439943481625,1.41087421045813,1.00943396226415,0,0 +"fsvs",-0.0088293976,2.3566933183,-1.0467726594,"https://salsa.debian.org/debian/fsvs","https://github.com/phmarek/fsvs.git",2690.6840972222,8,4,0,3,6,0,0,7,1,"1",1.33333333333333,1.85714285714286,-0.475462316417216,1.36277028773849,1,0,0 +"fswatch",0.0801114642,1.6766491485,-0.5710250772,"https://salsa.debian.org/debian/fswatch","https://github.com/emcrisostomo/fswatch.git",4816.5607060185,6,27,0,22,362,0,6,368,3,"3",1.81818181818182,1.98369565217391,0.98683978780267,1.40843730857071,1.01630434782609,1,1 +"ftgl",1.2143599406,2.1964355506,0.6199512905,"https://salsa.debian.org/ftgl-team/ftgl","https://github.com/frankheckenbach/ftgl",5371.3004976852,3,17,0,10,18,0,0,23,4,"4",1.85,1.78260869565217,1.36842221892412,1.33514369850296,1,0,0 +"funcoeszz",1.014177301,3.1202339314,0.1028457996,"https://salsa.debian.org/debian/funcoeszz","https://github.com//funcoeszz/funcoeszz",5372.2990972222,4,52,0,0,0,0,6,6,4,"4",1.92857142857143,1,1.36910911401398,1,2,0,0 +"fusioninventory-agent",0.4127421594,1.2756692416,0.0042753938,"https://salsa.debian.org/perl-team/modules/packages/fusioninventory-agent","https://github.com/fusioninventory/fusioninventory-agent.git",5660.8499537037,88,75,0,69,277,0,0,307,4,"4",1.4601226993865,1.90228013029316,1.56759124738966,1.37923171740399,1,1,0 +"fuzzylite",0.0236301475,2.058515685,-0.6491075451,"https://salsa.debian.org/debian/fuzzylite","https://github.com/fuzzylite/fuzzylite",3931.5160648148,3,20,0,8,30,0,0,30,3,"3",1.8695652173913,2,0.378054388026575,1.4142135623731,1,0,1 +"fuzzywuzzy",-0.4399858222,1.3206226327,-0.8570537668,"https://salsa.debian.org/python-team/packages/fuzzywuzzy","https://github.com/seatgeek/fuzzywuzzy",3716.0564236111,14,64,0,61,347,0,2,353,2,"2",1.82051282051282,1.98300283286119,0.229848661785,1.4081913338965,1.0056657223796,1,0 +"fvwm2-debian",0.3091526029,0.4698895246,0.1811764904,"https://github.com/somiaj/fvwm2-debian","https://github.com/somiaj/fvwm2-debian",699.9356018519,1,3,0,1,0,0,0,1,1,"1",1.75,1,-1.84481541137453,1,1,1,0 +"sight",-0.1731785778,1.2619602504,-0.8211865446,"https://salsa.debian.org/med-team/fw4spl","https://github.com/IRCAD/sight",5192.8487268519,18,189,0,40,13,0,0,45,4,"4",1.91304347826087,1.28888888888889,1.24567266755714,1.13529242439509,1,1,0 +"fwupdate",-0.0344756086,2.1966931571,-0.4710643437,"https://salsa.debian.org/efi-team/fwupdate","https://github.com/rhinstaller/fwupdate.git",2299.0056365741,21,5,0,15,40,0,3,49,1,"1",1.19230769230769,1.81632653061224,-0.744881639633544,1.3477115902938,1.06122448979592,1,0 +"fzy",-0.3762088336,1.9399715065,-0.8640459444,"https://salsa.debian.org/debian/fzy","https://github.com/jhawthorn/fzy",2752.1003125,14,25,0,30,165,0,3,168,2,"2",1.64102564102564,1.98214285714286,-0.433216656221162,1.40788595317336,1.01785714285714,1,0 +"g810-led",-0.8841874287,0.5790349373,-1.1503333071,"https://salsa.debian.org/debian/g810-led","https://github.com/MatMoul/g810-led.git",2361.9422453704,17,31,0,31,369,0,2,376,1,"1",1.64583333333333,1.9813829787234,-0.701590163969111,1.40761606225682,1.00531914893617,1,1 +"monitor-core",1.9418594289,3.110187068,1.2272175248,"https://salsa.debian.org/debian/ganglia","https://github.com/ganglia/monitor-core.git",5029.4003703704,5,128,0,60,190,0,20,215,4,"4",1.96240601503759,1.88372093023256,1.13324334093244,1.37248713299344,1.09302325581395,0,0 +"ganglia-web",2.9867677001,5.9425493751,1.6513889403,"https://salsa.debian.org/debian/ganglia-web","https://github.com/ganglia/ganglia-web",3989.7465162037,9,91,0,54,144,0,10,160,3,"3",1.91,1.9,0.41810869373902,1.37840487520902,1.0625,0,0 +"garglk",0.3494600276,1.5754786967,-0.2152021362,"https://salsa.debian.org/games-team/gargoyle-free","https://github.com/garglk/garglk.git",5517.4756134259,6,35,0,30,137,0,4,145,4,"4",1.85365853658537,1.9448275862069,1.46897000163539,1.39457075338862,1.02758620689655,0,0 +"gaupol",0.4507268429,1.4194389083,0.0001075777,"https://salsa.debian.org/python-team/packages/gaupol","https://github.com/otsaloma/gaupol",5574.4414699074,17,10,0,13,96,0,0,102,4,"4",1.37037037037037,1.94117647058824,1.50815444510539,1.39326109203847,1,1,0 +"geographiclib",-0.2708682617,0.4210044305,-0.5188380677,"https://salsa.debian.org/debian-gis-team/geographiclib","https://github.com/geographiclib/geographiclib.git",5589.1283333333,0,17,0,9,0,0,0,9,4,"4",2,1,1.51825692763106,1,1,0,0 +"geoipupdate",0.0025717488,1.6500054943,-0.358124043,"https://salsa.debian.org/debian/geoipupdate","https://github.com/maxmind/geoipupdate",3751.8112615741,25,42,0,34,57,0,0,77,2,"2",1.62686567164179,1.74025974025974,0.254442927780024,1.31918904644472,1,1,0 +"geolinks",-0.181262941,2.4550244029,-0.7445474906,"https://salsa.debian.org/debian-gis-team/geolinks","https://github.com/geopython/geolinks.git",3405.8642361111,2,3,0,4,8,0,0,8,2,"2",1.6,2,0.0164803568622367,1.4142135623731,1,1,1 +"geophar",-0.941493032,-0.2177195536,-1.1312469677,"https://salsa.debian.org/georgesk/geophar","https://github.com/wxgeo/geophar",4439.4260185185,0,6,0,3,5,0,0,7,3,"3",2,1.71428571428571,0.727424521261017,1.30930734141595,1,0,0 +"geopy",-0.1987709641,1.3312828211,-0.5312977883,"https://salsa.debian.org/python-team/packages/geopy","https://github.com/geopy/geopy",5485.118125,94,49,3,101,381,0,0,395,4,"4",1.34265734265734,1.96455696202532,1.44671263109154,1.40162654156709,1,0,0 +"gerbv",0.7065741787,1.742115916,0.1740178886,"https://salsa.debian.org/electronics-team/gerbv","https://github.com/gerbv/gerbv.git",5724.3901851852,29,11,0,24,49,0,0,64,4,"4",1.275,1.765625,1.61129792999464,1.32876822659183,1,1,0 +"ghp-import",-0.4929741774,2.5133796067,-1.274122331,"https://salsa.debian.org/python-team/packages/ghp-import","https://github.com/c-w/ghp-import.git",4494.8705092593,15,11,0,21,78,0,0,84,3,"3",1.42307692307692,1.92857142857143,0.765562480511426,1.38873014965883,1,1,0 +"git-big-picture",0.3518387907,3.3166834133,-0.4853412989,"https://salsa.debian.org/python-team/packages/git-big-picture","https://github.com/git-big-picture/git-big-picture.git",5024.3069097222,14,10,0,14,46,0,0,48,4,"4",1.41666666666667,1.95833333333333,1.129739761189,1.39940463531222,1,0,0 +"git-ftp",-0.1788027121,1.7435604018,-0.6973926208,"https://salsa.debian.org/debian/git-ftp","https://github.com/git-ftp/git-ftp",4532.203599537,24,92,3,82,432,0,0,479,3,"3",1.79310344827586,1.90187891440501,0.791242360634394,1.37908626068314,1,1,0 +"gitinspector",-0.5400481096,0.210511756,-0.7012239295,"https://salsa.debian.org/python-team/packages/gitinspector","https://github.com/ejwa/gitinspector",3089.9889236111,14,6,3,18,213,0,0,217,2,"2",1.3,1.9815668202765,-0.200797133387492,1.40768136319144,1,1,0 +"gitsome",-1.5867602711,-1.1930128544,-1.6624023004,"https://salsa.debian.org/debian/gitsome","https://github.com/donnemartin/gitsome",1294.2226388889,14,16,0,27,199,0,0,199,1,"1",1.53333333333333,2,-1.43603007492837,1.4142135623731,1,1,1 +"givaro",0.5117865646,1.6258650747,-0.0135088131,"https://salsa.debian.org/math-team/givaro","https://github.com/linbox-team/givaro",5710.7340740741,9,44,0,21,43,0,0,44,4,"4",1.83018867924528,1.97727272727273,1.60190445911746,1.40615529984164,1,1,0 +"lieer",-1.7520281461,0.654977795,-2.4063141302,"https://salsa.debian.org/debian/lieer","https://github.com/gauteh/lieer",2464.2436689815,23,14,0,29,147,0,7,154,1,"1",1.37837837837838,1.95454545454545,-0.631221269371835,1.39805059083906,1.04545454545455,1,0 +"gmrender-resurrect",-0.6885555604,0.4388812357,-0.9886243591,"https://salsa.debian.org/debian/gmrender-resurrect","https://github.com/hzeller/gmrender-resurrect.git",3933.2407407407,9,14,0,17,244,0,41,286,3,"3",1.60869565217391,1.85314685314685,0.379240720866922,1.36130336558272,1.14335664335664,1,0 +"gnome-gmail",0.1152563841,1.2377514132,-0.3137068328,"https://github.com/davesteele/gnome-gmail/tree/debian","https://github.com/davesteele/gnome-gmail",5107.0565740741,6,30,0,8,52,0,0,53,4,"4",1.83333333333333,1.9811320754717,1.18665981374736,1.40752693596666,1,1,0 +"gnome-hwp-support",-0.1527039415,2.6330164164,-0.8636063871,"https://salsa.debian.org/l10n-korean-team/gnome-hwp-support","https://github.com/changwoo/gnome-hwp-support.git",4275.4146296296,1,2,0,1,2,0,0,2,3,"3",1.66666666666667,2,0.614607908059716,1.4142135623731,1,0,0 +"gnome-keysign",-0.6319731543,0.8678564413,-0.9085456046,"https://salsa.debian.org/debian/gnome-keysign","https://github.com/gnome-keysign/gnome-keysign",3520.8003356482,42,26,0,52,24,0,0,62,2,"2",1.38235294117647,1.38709677419355,0.0955401195542453,1.17775072667927,1,0,0 +"gnome-mastermind",0.1896631142,2.1249915571,-0.4064733165,"https://salsa.debian.org/debian/gnome-mastermind","https://github.com/fargiolas/gnome-mastermind",5420.9395486111,1,6,0,3,2,0,0,3,4,"4",1.85714285714286,1.66666666666667,1.40256685757345,1.29099444873581,1,1,0 +"googler",-0.3686431402,0.6283580924,-0.5542725364,"https://salsa.debian.org/debian/googler","https://github.com/jarun/googler.git",4778.9107060185,15,26,0,29,68,0,6,94,3,"3",1.63414634146341,1.72340425531915,0.960941918661971,1.31278492348105,1.06382978723404,1,0 +"GPaste",-0.3060429164,-0.2513668941,-0.3230260451,"https://salsa.debian.org/debian/gpaste","https://github.com/Keruspe/GPaste",4709.6430092593,65,21,2,60,352,0,0,376,3,"3",1.24418604651163,1.93617021276596,0.913295550897102,1.39146333504191,1,1,0 +"gpick",0.3287244142,1.9268349477,-0.1661653459,"https://salsa.debian.org/elias/gpick","https://github.com/thezbyg/gpick.git",5237.0590625,5,6,0,8,64,0,1,67,4,"4",1.54545454545455,1.95522388059702,1.27608311874654,1.39829320265709,1.01492537313433,0,0 +"grabserial",-0.534268649,2.390246914,-1.2967244647,"https://salsa.debian.org/debian/grabserial","https://github.com/tbird20d/grabserial",3634.0012152778,11,19,0,17,53,0,1,55,2,"2",1.63333333333333,1.96363636363636,0.173406296639487,1.40129809949074,1.01818181818182,1,0 +"grantlee",0.8850917122,2.9819943474,0.1506454305,"https://salsa.debian.org/qt-kde-team/extras/grantlee","https://github.com/steveire/grantlee.git",4939.9756481482,29,11,0,23,19,0,1,37,3,"3",1.275,1.51351351351351,1.07173179368001,1.23024937045849,1.02702702702703,1,0 +"graphite",0.3733807726,1.1779395242,0.0796158429,"https://salsa.debian.org/libreoffice-team/graphite2","https://github.com/silnrsi/graphite.git",4797.7791319445,6,20,0,12,63,0,0,66,3,"3",1.76923076923077,1.95454545454545,0.973920724120737,1.39805059083906,1,0,0 +"gravit",0.6045580957,3.2029078171,-0.2991692425,"https://salsa.debian.org/debian-astro-team/gravit","https://github.com/gak/gravit",4467.9773263889,1,15,2,3,13,0,0,13,3,"3",1.9375,2,0.747063778499354,1.4142135623731,1,0,0 +"grcompiler",-0.2033731514,1.6514805751,-0.9604435457,"https://salsa.debian.org/fonts-team/grcompiler","https://github.com/silnrsi/grcompiler.git",4870.0000925926,3,20,0,10,14,0,0,15,3,"3",1.8695652173913,1.93333333333333,1.02359851928887,1.39044357430761,1,1,0 +"gsa",0.417412477,2.9619681562,-0.4656797598,"https://salsa.debian.org/pkg-security-team/greenbone-security-assistant","https://github.com/greenbone/gsa",5193.7357407407,22,54,0,37,36,0,0,62,4,"4",1.71052631578947,1.58064516129032,1.24628280752044,1.25723711418742,1,0,0 +"grepcidr-pkg-debian",-0.000512138,1.8231074226,-0.4693331824,"https://github.com/rfinnie/grepcidr-pkg-debian","https://github.com/rfinnie/grepcidr-pkg-debian",3175.8474652778,0,1,0,1,0,0,0,1,2,"2",2,1,-0.141738613422142,1,1,0,0 +"grok",0.7555036124,3.2549577139,-0.2949948657,"https://salsa.debian.org/debian/grok","https://github.com/jordansissel/grok",2851.8223263889,0,12,0,5,47,0,0,47,2,"2",2,2,-0.364622030294425,1.4142135623731,1,0,0 +"gromit-mpx",-0.1368392632,2.3961082606,-0.7236856316,"https://salsa.debian.org/debian/gromit-mpx","https://github.com/bk138/gromit-mpx.git",5287.5376388889,14,15,0,22,52,0,0,63,4,"4",1.51724137931034,1.82539682539683,1.3108052320461,1.3510724722963,1,1,1 +"grun",3.4314737452,6.9914396992,1.9512456029,"https://salsa.debian.org/debian/grun","https://github.com/lrgc/grun.git",1780.0517708333,1,4,0,2,2,0,0,3,1,"1",1.8,1.66666666666667,-1.10184842064324,1.29099444873581,1,0,0 +"textfsm",-1.959276856,0.4998119958,-2.4671799826,"https://salsa.debian.org/python-team/packages/gtextfsm","https://github.com/google/textfsm.git",4331.1065625,11,7,0,12,114,0,11,125,3,"3",1.38888888888889,1.912,0.652916072459987,1.38275088139549,1.088,1,0 +"gtimelog",-0.3131503011,0.4195928542,-0.6469396999,"https://salsa.debian.org/python-team/packages/gtimelog","https://github.com/gtimelog/gtimelog",5699.091412037,18,41,2,31,102,0,0,108,4,"4",1.69491525423729,1.94444444444444,1.59389595611915,1.39443337755679,1,0,0 +"gtkhash",-0.0470549768,0.3813091669,-0.1959531443,"https://salsa.debian.org/debian/gtkhash","https://github.com/tristanheaven/gtkhash",4558.9808449074,79,10,0,62,43,0,0,96,3,"3",1.1123595505618,1.44791666666667,0.809661314062043,1.20329408984947,1,1,0 +"guessit",0.5092433942,2.4339696308,-0.2792039187,"https://salsa.debian.org/python-team/packages/guessit","https://github.com/guessit-io/guessit.git",2993.2388078704,14,29,0,17,232,0,0,242,2,"2",1.67441860465116,1.95867768595041,-0.267347514178995,1.3995276653037,1,1,1 +"guidata",0.226943724,2.7660796551,-0.444547265,"https://salsa.debian.org/science-team/guidata","https://github.com/Codra-Ingenierie-Informatique/guidata",4839.0752893519,0,24,0,9,22,0,0,27,3,"3",2,1.81481481481481,1.00232663329871,1.34715062810913,1,1,0 +"guile-json",-0.447679014,2.3175980112,-1.1284049069,"https://salsa.debian.org/debian/guile-json","https://github.com/aconchillo/guile-json.git",3764.8305324074,3,17,0,14,43,0,0,45,2,"2",1.85,1.95555555555556,0.263398342716229,1.3984117975602,1,1,0 +"harminv",-0.2633327682,0.7959993879,-0.5621576388,"https://salsa.debian.org/alteholz/harminv","https://github.com/NanoComp/harminv",2906.4731712963,1,5,0,4,15,0,0,15,2,"2",1.83333333333333,2,-0.327029987005169,1.4142135623731,1,1,0 +"harvid",0.172456355,1.3037883065,-0.1734116499,"https://salsa.debian.org/multimedia-team/harvid","https://github.com/x42/harvid.git",3621.9749189815,0,4,0,4,14,0,0,14,2,"2",2,2,0.165133907589584,1.4142135623731,1,1,0 +"hashcat",0.6568099259,2.9193273288,-0.0688683154,"https://salsa.debian.org/pkg-security-team/hashcat","https://github.com/hashcat/hashcat.git",2915.0251851852,48,153,0,135,297,0,0,392,2,"2",1.76119402985075,1.75765306122449,-0.321147412328299,1.32576508523361,1,1,0 +"haveged",0.9608769092,1.929900484,0.4239904529,"https://salsa.debian.org/debian/haveged","https://github.com/jirka-h/haveged",1886.382650463,9,23,0,22,68,0,1,73,1,"1",1.71875,1.93150684931507,-1.02870783083539,1.38978662006621,1.01369863013699,1,0 +"haxe-debian",-0.5201211998,0.2916566292,-0.8543651007,"https://github.com/HaxeFoundation/haxe-debian","https://github.com/HaxeFoundation/haxe-debian",5039.1597916667,3,5,0,5,4,0,0,7,4,"4",1.625,1.57142857142857,1.13995644094892,1.25356634105602,1,0,1 +"hcxdumptool",0.1119022392,3.6410156171,-0.7455348999,"https://salsa.debian.org/pkg-security-team/hcxdumptool","https://github.com/ZerBea/hcxdumptool",2117.0106134259,10,18,0,22,84,0,7,102,1,"1",1.64285714285714,1.82352941176471,-0.870068446904474,1.350381209794,1.06862745098039,1,0 +"hdapsd",0.6538996291,2.6942351149,-0.1231193096,"https://salsa.debian.org/debian/hdapsd","https://github.com/evgeni/hdapsd.git",2619.5010416667,2,5,0,5,12,0,0,13,1,"1",1.71428571428571,1.92307692307692,-0.524426179838502,1.38675049056307,1,1,0 +"HDMI2USB-mode-switch",-0.1979989796,2.8942330744,-1.0013410785,"https://salsa.debian.org/debian/hdmi2usb-mode-switch","https://github.com/timvideos/HDMI2USB-mode-switch.git",1539.4512152778,3,11,0,8,15,0,0,15,1,"1",1.78571428571429,2,-1.26734753625959,1.4142135623731,1,1,0 +"hesiod",1.3520798772,2.882041099,0.5698299795,"https://github.com/achernya/hesiod","https://github.com/achernya/hesiod",2444.8183564815,0,5,0,6,15,0,0,17,1,"1",2,1.88235294117647,-0.644583133944004,1.37198868114007,1,1,0 +"hexchat",0.4113463635,1.0763225756,0.0766285755,"https://salsa.debian.org/debian/hexchat","https://github.com/hexchat/hexchat",4968.6586458333,146,71,1,160,5,0,0,162,3,"3",1.32718894009217,1.03086419753086,1.09146163486492,1.01531482680539,1,0,0 +"hg-git",0.321128458,1.270139629,-0.1895586953,"https://salsa.debian.org/python-team/packages/hg-git","https://github.com/schacon/hg-git.git",2615.4964467593,1,76,0,52,117,0,4,163,1,"1",1.98701298701299,1.71779141104294,-0.527180774124647,1.31064541774003,1.02453987730061,1,0 +"hidapi",0.225542389,1.7475434274,-0.1119105457,"https://salsa.debian.org/debian/hidapi","https://github.com/libusb/hidapi.git",4972.5820717593,120,14,0,103,49,0,4,137,3,"3",1.1044776119403,1.35766423357664,1.09416039638456,1.16518849701524,1.02919708029197,1,0 +"hippomocks",-1.8899787337,1.9694566517,-3.0475420799,"https://salsa.debian.org/debian-iot-team/hippomocks","https://github.com/dascandy/hippomocks",3806.1184837963,0,35,0,21,73,0,1,77,3,"3",2,1.94805194805195,0.29179860731536,1.39572631559771,1.01298701298701,1,0 +"hitch",-0.5288912788,2.1847591306,-1.4438568394,"https://salsa.debian.org/debian/hitch","https://github.com/varnish/hitch",4466.179224537,30,59,0,59,215,0,20,260,3,"3",1.66292134831461,1.82692307692308,0.745826939018288,1.35163718390812,1.07692307692308,1,0 +"hol-light",0.6740208455,3.3227951452,-0.2913969773,"https://salsa.debian.org/ocaml-team/hol-light","https://github.com/jrh13/hol-light.git",2937.7842708333,2,18,0,10,39,0,0,39,2,"2",1.9,2,-0.305492383858805,1.4142135623731,1,0,0 +"htmldoc",0.7571165722,1.6423946949,0.2768464827,"https://salsa.debian.org/haava/htmldoc","https://github.com/michaelrsweet/htmldoc.git",5679.7610416667,3,12,0,7,61,0,0,65,4,"4",1.8,1.93846153846154,1.58059939828937,1.39228644267677,1,0,1 +"htmlmin",0.3749839326,3.8009648796,-0.4061989629,"https://salsa.debian.org/python-team/packages/htmlmin","https://github.com/mankyd/htmlmin",1758.1454050926,0,22,0,16,60,0,0,60,1,"1",2,2,-1.11691689855296,1.4142135623731,1,0,0 +"htpdate",-0.4445412636,1.6194045516,-0.91888023,"https://salsa.debian.org/debian/htpdate","https://github.com/twekkel/htpdate",706.8257407407,6,5,0,5,17,0,0,17,1,"1",1.45454545454545,2,-1.84007597139303,1.4142135623731,1,1,0 +"hubicfuse",-0.6743910684,0.4155398958,-0.9708496832,"https://salsa.debian.org/debian/hubicfuse","https://github.com/TurboGit/hubicfuse",4598.8082291667,5,42,0,32,165,0,1,182,3,"3",1.8936170212766,1.90659340659341,0.837056915277546,1.38079448383654,1.00549450549451,1,0 +"hw-probe",-0.2705391309,2.1366348662,-0.8036350878,"https://salsa.debian.org/debian/hw-probe","https://github.com/linuxhw/hw-probe",2812.8207638889,5,13,0,14,115,0,0,116,2,"2",1.72222222222222,1.99137931034483,-0.39144958306754,1.41116239687175,1,1,0 +"hwdata",0.2497218136,0.8673309736,-0.0033926663,"https://salsa.debian.org/pino/hwdata","https://github.com/vcrhonek/hwdata.git",5761.1231481482,4,18,0,12,14,0,0,19,4,"4",1.81818181818182,1.73684210526316,1.63656500749706,1.31789305532094,1,0,0 +"hwinfo",1.0352583411,1.8703572076,0.5288235361,"https://salsa.debian.org/debian/hwinfo","https://github.com/openSUSE/hwinfo",5630.0100347222,11,25,0,19,74,0,0,77,4,"4",1.69444444444444,1.96103896103896,1.54637774975108,1.4003710083542,1,1,0 +"hwloc",0.034853164,0.3073992793,-0.0657896516,"https://salsa.debian.org/debian/hwloc","https://github.com/open-mpi/hwloc.git",5420.947349537,40,25,0,39,173,0,7,189,4,"4",1.38461538461538,1.91534391534392,1.40257222350594,1.38395950639602,1.03703703703704,0,0 +"hyperlink",0.844118141,3.90404712,0.0109391917,"https://salsa.debian.org/python-team/packages/hyperlink","https://github.com/python-hyper/hyperlink",1636.1480324074,8,24,0,21,47,0,0,49,1,"1",1.75,1.95918367346939,-1.20083381736598,1.39970842444753,1,1,0 +"hyperscan",-0.1939906796,1.1323195527,-0.5069001368,"https://salsa.debian.org/debian/hyperscan","https://github.com/intel/hyperscan.git",2738.472962963,25,11,0,26,361,0,0,365,1,"1",1.30555555555556,1.98904109589041,-0.442590343207717,1.41033368246327,1,1,0 +"ibus-libpinyin",0.0745339719,1.4965685521,-0.4552149234,"https://salsa.debian.org/debian/ibus-libpinyin","https://github.com/libpinyin/ibus-libpinyin",5637.8364236111,33,12,0,32,417,0,2,432,4,"4",1.26666666666667,1.96527777777778,1.55176119716911,1.40188365343839,1.00462962962963,0,0 +"icdiff",-0.1438152922,1.9369823287,-0.574052024,"https://salsa.debian.org/debian/icdiff","https://github.com/jeffkaufman/icdiff.git",4767.043599537,37,19,0,47,225,0,0,225,3,"3",1.33928571428571,2,0.952779029664983,1.4142135623731,1,1,0 +"icecream",0.3064642839,1.1295017582,-0.1573898799,"https://salsa.debian.org/qt-kde-team/extras/icecc","https://github.com/icecc/icecream",5413.4717939815,34,86,1,89,308,0,0,324,4,"4",1.71666666666667,1.95061728395062,1.39743009974684,1.39664500999739,1,0,0 +"ifcplusplus",-4.714020503,-1.546680493,-5.4430250217,"https://salsa.debian.org/science-team/ifcplusplus","https://github.com/ifcquery/ifcplusplus",3159.9779050926,3,29,0,17,119,0,1,120,2,"2",1.90625,1.99166666666667,-0.152654623860303,1.41126420866777,1.00833333333333,1,0 +"ign-cmake",-0.0672943203,2.4451918145,-0.7211880559,"https://salsa.debian.org/science-team/ignition-cmake","https://github.com/ignitionrobotics/ign-cmake.git",2275.0046990741,21,38,0,34,52,0,0,56,1,"1",1.64406779661017,1.92857142857143,-0.76139088634348,1.38873014965883,1,1,1 +"imexam",-0.5291204946,0.5693013221,-0.7719216675,"https://salsa.debian.org/debian-astro-team/imexam","https://github.com/spacetelescope/imexam",3485.9386226852,6,15,1,15,95,0,0,95,2,"2",1.71428571428571,2,0.0715601971017519,1.4142135623731,1,0,0 +"imgp",-0.6548311047,1.5722939063,-1.0887948485,"https://salsa.debian.org/debian/imgp","https://github.com/jarun/imgp.git",2588.4491782407,7,6,0,8,44,0,2,47,1,"1",1.46153846153846,1.93617021276596,-0.54578546524571,1.39146333504191,1.04255319148936,1,0 +"indicator-sensors",-0.5585654847,1.870631377,-1.1666724793,"https://salsa.debian.org/debian/indicator-sensors","https://github.com/alexmurray/indicator-sensors.git",4448.0518287037,1,8,0,6,33,0,1,36,3,"3",1.88888888888889,1.91666666666667,0.733357857340932,1.38443731048635,1.02777777777778,1,0 +"influxdb-python",0.5184399777,1.9994055882,-0.0609733668,"https://salsa.debian.org/python-team/packages/influxdb-python","https://github.com/influxdata/influxdb-python",3542.0853240741,64,90,1,124,596,0,0,618,2,"2",1.58441558441558,1.96440129449838,0.110181177852127,1.40157100943847,1,0,0 +"infnoise",-0.8043001603,2.0102163079,-1.7895799595,"https://salsa.debian.org/debian/infnoise","https://github.com/13-37-org/infnoise.git",3061.3638078704,9,32,0,27,33,0,1,52,2,"2",1.78048780487805,1.63461538461538,-0.220487159990148,1.2785207798919,1.01923076923077,1,0 +"inkscape-open-symbols",0.1399161023,2.3946994301,-0.296432736,"https://salsa.debian.org/felix-guest/inkscape-open-symbols","https://github.com/Xaviju/inkscape-open-symbols",2971.3217939815,9,20,0,20,58,0,2,60,2,"2",1.68965517241379,1.96666666666667,-0.282423316507006,1.40237893119751,1.03333333333333,1,1 +"compute-runtime",-0.3353488286,2.5434327002,-1.0380631241,"https://salsa.debian.org/opencl-team/intel-compute-runtime","https://github.com/intel/compute-runtime",2183.6453703704,160,87,0,159,86,0,0,220,1,"1",1.35222672064777,1.39090909090909,-0.824233168934463,1.17936808966034,1,1,1 +"intelhex",-0.7181174872,1.5303194974,-1.1558028433,"https://salsa.debian.org/python-team/packages/intelhex","https://github.com/bialix/intelhex.git",2882.7775578704,4,21,0,12,61,0,0,63,2,"2",1.84,1.96825396825397,-0.343329213982926,1.4029447488244,1,0,0 +"invesalius3",-0.365553699,0.412659255,-0.6585148784,"https://salsa.debian.org/med-team/invesalius","https://github.com/invesalius/invesalius3.git",5269.8872106482,20,33,0,28,105,0,9,123,4,"4",1.62264150943396,1.85365853658537,1.29866423653867,1.36149129141004,1.07317073170732,1,0 +"ioq3",0.2457529541,0.9626997446,-0.0891553792,"https://salsa.debian.org/games-team/ioquake3","https://github.com/ioquake/ioq3",5764.2156828704,42,58,0,65,301,0,0,310,4,"4",1.58,1.97096774193548,1.63869223351428,1.40391158622453,1,1,1 +"iortcw",-0.3609137722,1.7540737172,-0.8999552481,"https://salsa.debian.org/games-team/iortcw","https://github.com/iortcw/iortcw.git",3601.8735763889,5,20,0,13,129,0,0,131,2,"2",1.8,1.98473282442748,0.151307030032731,1.40880546010707,1,0,0 +"irssi",1.759294185,2.3625896628,1.3052149799,"https://salsa.debian.org/rhonda/irssi","https://github.com/irssi/irssi.git",5749.0144675926,36,142,0,114,230,0,5,301,4,"4",1.79775280898876,1.7641196013289,1.62823594974153,1.32820164181833,1.01661129568106,1,0 +"irssi-xmpp",0.6035691601,1.5557972582,0.0980337918,"https://salsa.debian.org/debian/irssi-plugin-xmpp","https://github.com/cdidier/irssi-xmpp",4266.8623958333,7,12,0,12,44,0,0,46,3,"3",1.63157894736842,1.95652173913043,0.608725182117691,1.39875721236047,1,1,0 +"irstlm",-0.5699998346,2.5734688359,-1.3621281388,"https://salsa.debian.org/science-team/irstlm","https://github.com/irstlm-team/irstlm.git",1268.8947337963,1,9,0,3,31,0,0,33,1,"1",1.9,1.93939393939394,-1.45345208745682,1.39262124764558,1,1,0 +"islamic-menus",-0.8360403457,1.8927666646,-1.5208014105,"https://salsa.debian.org/islamic-team/islamic-menus","https://github.com/ojuba-org/islamic-menus",1447.6479050926,0,9,0,5,1,0,0,5,1,"1",2,1.2,-1.33049521524656,1.09544511501033,1,0,0 +"ismrmrd",-0.4211375034,0.8719718551,-0.792919077,"https://salsa.debian.org/med-team/ismrmrd","https://github.com/ismrmrd/ismrmrd.git",4121.9187384259,23,44,0,33,72,0,1,77,3,"3",1.65671641791045,1.93506493506494,0.509024468377689,1.39106611455564,1.01298701298701,0,0 +"flags",1.0476074347,4.844542624,0.0451502018,"https://salsa.debian.org/cinnamon-team/iso-flags-svg","https://github.com/linuxmint/flags.git",563.1795833333,0,2,0,1,0,0,0,1,1,"1",2,1,-1.93888418884591,1,1,0,0 +"isodate",0.7844107872,3.6859500169,-0.0654948523,"https://salsa.debian.org/python-team/packages/isodate","https://github.com/gweis/isodate",4815.1887152778,2,29,0,18,81,0,0,82,3,"3",1.93548387096774,1.98780487804878,0.985896052433085,1.40989534294173,1,0,0 +"ivtools",0.3988011669,1.0923186651,-0.0474693289,"https://salsa.debian.org/debian/ivtools","https://github.com/vectaport/ivtools",4623.9669328704,2,10,0,4,7,0,1,8,3,"3",1.83333333333333,1.875,0.85436254120764,1.36930639376292,1.125,0,0 +"include-what-you-use",0.2936470135,1.7756158607,-0.3256054834,"https://salsa.debian.org/pkg-llvm-team/iwyu","https://github.com/include-what-you-use/include-what-you-use",4692.8704050926,67,17,1,60,285,0,1,306,3,"3",1.20238095238095,1.93137254901961,0.901758374061565,1.38973830235034,1.00326797385621,1,1 +"jabberd2",-0.0340967947,0.9124576514,-0.5754415701,"https://salsa.debian.org/xmpp-team/jabberd2","https://github.com/jabberd2/jabberd2",3913.9184490741,17,25,0,26,119,0,5,129,3,"3",1.5952380952381,1.92248062015504,0.365949720041424,1.38653547381776,1.03875968992248,1,0 +"jansson",0.1407028183,0.668384438,-0.002779965,"https://salsa.debian.org/debian/jansson","https://github.com/akheron/jansson.git",5159.4155902778,29,84,0,80,127,0,3,188,4,"4",1.74336283185841,1.67553191489362,1.22267540338824,1.29442339089404,1.01595744680851,0,1 +"janus-gateway",-1.0533724499,0.8744335289,-1.6790293476,"https://salsa.debian.org/pkg-voip-team/janus","https://github.com/meetecho/janus-gateway",3591.8742708333,192,158,0,273,152,0,0,393,2,"2",1.45142857142857,1.38676844783715,0.144428923611037,1.17761133139808,1,1,0 +"jimtcl",0.0276014571,0.4709064501,-0.0432191953,"https://salsa.debian.org/debian/jimtcl","https://github.com/msteveb/jimtcl.git",5640.2291087963,31,13,0,32,66,0,2,79,4,"4",1.29545454545455,1.83544303797468,1.5534070257965,1.35478523684556,1.0253164556962,0,0 +"Jool",-2.1435730131,-0.0424378709,-2.6129119375,"https://github.com/NICMx/Jool","https://github.com/NICMx/Jool",4435.2104050926,8,57,3,37,162,0,6,172,3,"3",1.87692307692308,1.94186046511628,0.724524776112232,1.39350653572787,1.03488372093023,1,0 +"jopt-simple",-0.2557722008,1.1092730965,-0.5210596763,"https://salsa.debian.org/java-team/joptsimple","https://github.com/jopt-simple/jopt-simple.git",3771.2237962963,2,25,0,24,63,0,0,70,3,"3",1.92592592592593,1.9,0.267796003050271,1.37840487520902,1,1,0 +"jpy",-0.2335047706,1.5585712074,-0.6921580176,"https://salsa.debian.org/python-team/packages/jpy","https://github.com/jpy-consortium/jpy",3656.2358564815,16,28,3,25,27,0,0,44,2,"2",1.63636363636364,1.61363636363636,0.188700581587264,1.27028987386201,1,0,0 +"jpylyzer",-1.218476643,-0.4298985846,-1.4717139107,"https://salsa.debian.org/python-team/packages/jpylyzer","https://github.com/openpreserve/jpylyzer.git",3586.5846064815,2,28,0,16,31,0,2,37,2,"2",1.93333333333333,1.83783783783784,0.140790383499984,1.35566877880913,1.05405405405405,1,0 +"jq",0.9075077567,2.0772581347,0.3378546024,"https://salsa.debian.org/debian/jq","https://github.com/jqlang/jq",4164.9958796296,128,79,5,168,233,0,76,457,3,"3",1.38164251207729,1.50984682713348,0.538655442238215,1.22875824600833,1.16630196936543,0,0 +"jquery-i18n-properties",-0.8429862877,1.002530129,-1.1610901473,"https://salsa.debian.org/js-team/jquery-i18n-properties/","https://github.com/jquery-i18n-properties/jquery-i18n-properties.git",2244.4631597222,1,17,0,13,101,0,3,106,1,"1",1.94444444444444,1.95283018867925,-0.782399141044437,1.39743700705228,1.02830188679245,1,0 +"JSJaC",-0.3265912384,2.0049639122,-1.1507866217,"https://salsa.debian.org/xmpp-team/jsjac","https://github.com/sstrigler/JSJaC.git",3682.6423958333,1,21,0,12,56,0,0,56,2,"2",1.95454545454545,2,0.20686454176234,1.4142135623731,1,1,0 +"json-c",0.7000238519,1.5684181486,0.2497560899,"https://salsa.debian.org/debian/json-c","https://github.com/json-c/json-c",5592.2949652778,18,150,0,130,463,0,13,500,4,"4",1.89285714285714,1.926,1.52043512204581,1.38780402074645,1.026,1,0 +"JSON-js",0.6358541009,3.1706913966,-0.0862776907,"https://salsa.debian.org/js-team/json-js","https://github.com/douglascrockford/JSON-js",4556.1964236111,1,4,0,2,14,0,0,15,3,"3",1.8,1.93333333333333,0.80774602645609,1.39044357430761,1,0,0 +"jsonlint",0.1283791193,1.6136347642,-0.1615279631,"https://salsa.debian.org/php-team/pear/jsonlint","https://github.com/Seldaek/jsonlint",4166.9388888889,11,28,0,34,62,0,0,62,3,"3",1.71794871794872,2,0.539991957498149,1.4142135623731,1,1,0 +"jsonpickle",-0.0589038511,1.6549477485,-0.6288474464,"https://salsa.debian.org/python-team/packages/jsonpickle","https://github.com/jsonpickle/jsonpickle",5737.1075462963,18,67,1,58,346,0,5,359,4,"4",1.78823529411765,1.96378830083565,1.62004567378934,1.40135231146049,1.01392757660167,0,0 +"jsusfx",-0.4818415459,1.4674471205,-0.8815812329,"https://salsa.debian.org/multimedia-team/pd/jsusfx","https://github.com/asb2m10/jsusfx.git",2697.3649768519,1,8,0,4,11,0,1,12,1,"1",1.88888888888889,1.91666666666667,-0.470866817176984,1.38443731048635,1.08333333333333,1,0 +"keepassxc",0.077500136,0.7662262759,-0.1344432376,"https://salsa.debian.org/debian/keepassxc","https://github.com/keepassxreboot/keepassxc.git",4876.4075,354,94,0,352,4,0,6,360,3,"3",1.20982142857143,1.01111111111111,1.02800590836106,1.00554020859989,1.01666666666667,1,0 +"keras",0.5999454369,3.4232399441,-0.326875434,"https://salsa.debian.org/science-team/keras","https://github.com/keras-team/keras",3182.8412268519,1036,333,0,411,453,0,19,839,2,"2",1.24324324324324,1.53992848629321,-0.136927895705083,1.24093855057098,1.02264600715137,1,1 +"klaus",-1.7963750896,-1.1425182339,-1.9244411722,"https://salsa.debian.org/jelmer/klaus","https://github.com/jonashaag/klaus",4576.8670717593,13,28,0,23,110,0,20,131,3,"3",1.68292682926829,1.83969465648855,0.821964505627286,1.3563534408437,1.15267175572519,0,0 +"klystrack",-0.5775196532,1.4334446874,-1.0926907229,"https://salsa.debian.org/multimedia-team/klystrack","https://github.com/kometbomb/klystrack",3882.7988194445,10,13,4,10,56,0,1,57,3,"3",1.56521739130435,1.98245614035088,0.344543821081148,1.40799720892865,1.01754385964912,1,0 +"pvr.dvbviewer",-0.2612255055,1.7338835217,-0.6785034929,"https://salsa.debian.org/multimedia-team/kodi-media-center/kodi-pvr-dvbviewer","https://github.com/kodi-pvr/pvr.dvbviewer.git",4026.1822916667,9,44,0,32,52,0,0,65,3,"3",1.83018867924528,1.8,0.443171348320179,1.34164078649987,1,1,0 +"pvr.hdhomerun",0.5662601343,3.972730551,-0.5089735041,"https://salsa.debian.org/multimedia-team/kodi-media-center/kodi-pvr-hdhomerun","https://github.com/kodi-pvr/pvr.hdhomerun.git",2925.247337963,9,28,0,19,39,0,0,42,2,"2",1.75675675675676,1.92857142857143,-0.314116018570644,1.38873014965883,1,1,0 +"pvr.iptvsimple",0.0810763451,2.1337559183,-0.4122427721,"https://salsa.debian.org/multimedia-team/kodi-media-center/kodi-pvr-iptvsimple","https://github.com/kodi-pvr/pvr.iptvsimple.git",3805.7589236111,16,66,0,49,379,0,0,389,3,"3",1.80487804878049,1.97429305912596,0.291551280818028,1.40509539146848,1,1,0 +"pvr.njoy",-0.3919469766,1.5882858351,-0.7945898934,"https://salsa.debian.org/multimedia-team/kodi-media-center/kodi-pvr-njoy","https://github.com/kodi-pvr/pvr.njoy.git",4095.3650578704,9,40,0,28,19,0,0,33,3,"3",1.81632653061224,1.57575757575758,0.490759295888173,1.2552918289217,1,1,0 +"pvr.vdr.vnsi",-0.2767088162,1.1621317981,-0.6036919178,"https://salsa.debian.org/multimedia-team/kodi-media-center/kodi-pvr-vdr-vnsi","https://github.com/kodi-pvr/pvr.vdr.vnsi.git",4099.2902199074,12,57,0,44,64,0,0,80,3,"3",1.82608695652174,1.8,0.493459251606374,1.34164078649987,1,0,0 +"KWStyle",-0.5443680459,1.2886528987,-0.9977067271,"https://salsa.debian.org/eikel/kwstyle","https://github.com/Kitware/KWStyle",2816.187662037,4,44,0,30,32,0,0,49,2,"2",1.91666666666667,1.6530612244898,-0.38913363386038,1.28571428571429,1,1,0 +"lablgtk",-0.5519683235,1.0254829683,-0.8566505829,"https://salsa.debian.org/ocaml-team/lablgtk3","https://github.com/garrigue/lablgtk.git",5750.3717824074,18,30,0,25,73,0,0,77,4,"4",1.625,1.94805194805195,1.62916959015206,1.39572631559771,1,1,0 +"lastpass-cli",-0.0433153425,1.3416622465,-0.5860041677,"https://salsa.debian.org/lamby/pkg-lastpass-cli","https://github.com/lastpass/lastpass-cli",3306.0089351852,30,62,0,67,0,0,1,68,2,"2",1.67391304347826,1,-0.0522059516738602,1,1.01470588235294,1,0 +"python-lazy-object-proxy",0.3043618863,2.7233170407,-0.1702005445,"https://salsa.debian.org/python-team/packages/lazy-object-proxy","https://github.com/ionelmc/python-lazy-object-proxy.git",3850.5882523148,8,10,0,14,87,0,0,89,3,"3",1.55555555555556,1.97752808988764,0.322387511586522,1.4062460986213,1,0,0 +"lcdproc",0.0416533252,0.5981870264,-0.2982890351,"https://salsa.debian.org/debian/lcdproc","https://github.com/lcdproc/lcdproc",1977.3798148148,39,20,0,41,113,0,0,115,1,"1",1.33898305084746,1.98260869565217,-0.966114666039707,1.40805138246165,1,1,0 +"ldap-git-backup",-1.373786898,-0.3569713865,-1.6171841836,"https://github.com/elmar/ldap-git-backup","https://github.com/elmar/ldap-git-backup",3900.9497222222,1,9,0,6,10,0,0,10,3,"3",1.9,2,0.357029072207905,1.4142135623731,1,0,0 +"ldap2dns",0.4410660379,3.2730345751,-0.8182558109,"https://salsa.debian.org/debian/ldap2dns","https://github.com/bklang/ldap2dns",1032.2710185185,0,4,0,1,4,0,0,4,1,"1",2,2,-1.61621570004249,1.4142135623731,1,0,0 +"ldapscripts",0.4789463026,1.4448695661,0.0155611927,"https://github.com/gerasiov/ldapscripts","https://github.com/gerasiov/ldapscripts",4203.2921643519,3,5,0,3,2,0,0,3,3,"3",1.625,1.66666666666667,0.564997863760474,1.29099444873581,1,0,0 +"pkg-ledgersmb",-1.9768906241,-1.2384100445,-2.32818406,"https://github.com/ledgersmb/pkg-ledgersmb","https://github.com/ledgersmb/pkg-ledgersmb",5388.1821643519,1,9,0,4,4,0,1,7,4,"4",1.9,1.57142857142857,1.38003441531751,1.25356634105602,1.14285714285714,0,0 +"ledmon",-0.0267359746,1.6972099329,-0.5787233435,"https://salsa.debian.org/debian/ledmon","https://github.com/intel/ledmon",4704.5067592593,35,24,0,32,75,0,0,79,3,"3",1.40677966101695,1.9493670886076,0.909762538138167,1.39619736735448,1,1,0 +"legit",-1.3724471459,-0.9914117218,-1.4783160816,"https://salsa.debian.org/python-team/packages/legit","https://github.com/frostming/legit",4465.0884027778,8,56,0,47,233,0,2,238,3,"3",1.875,1.97899159663866,0.74507660809729,1.40676636178104,1.00840336134454,0,0 +"mod_auth_openidc",0.2336891928,2.1536731239,-0.5343344056,"https://salsa.debian.org/debian/libapache2-mod-auth-openidc","https://github.com/zmartzone/mod_auth_openidc.git",3541.8657638889,12,50,0,46,138,0,41,214,2,"2",1.80645161290323,1.64485981308411,0.110030151532211,1.282520882124,1.19158878504673,1,0 +"libappimage",-0.1632051649,2.0657738619,-0.6650493915,"https://salsa.debian.org/qt-kde-team/3rdparty/libappimage","https://github.com/AppImageCommunity/libappimage.git",1789.5842476852,9,6,0,11,54,0,0,54,1,"1",1.4,2,-1.09529142627146,1.4142135623731,1,1,0 +"attean",-1.3143281259,1.0491513887,-1.7605023994,"https://salsa.debian.org/perl-team/modules/packages/libattean-perl","https://github.com/kasei/attean.git",3387.9902314815,2,10,0,9,20,0,0,20,2,"2",1.83333333333333,2,0.00418557245539401,1.4142135623731,1,1,0 +"libcec",0.2382725094,0.9041078801,-0.0486730427,"https://salsa.debian.org/debian/libcec","https://github.com/Pulse-Eight/libcec.git",3960.8179282408,30,52,0,62,729,0,2,741,3,"3",1.63414634146341,1.98380566801619,0.398209921216088,1.40847636402468,1.00269905533063,1,0 +"cereal",-1.0094893182,-0.4350648989,-1.165390033,"https://salsa.debian.org/med-team/libcereal","https://github.com/USCiLab/cereal",3631.1027546296,36,60,3,68,151,0,4,201,2,"2",1.625,1.75124378109453,0.171412566106246,1.32334567709821,1.01990049751244,1,0 +"CGI--Application--Dispatch",0.204830766,4.1969078733,-0.9847022953,"https://salsa.debian.org/perl-team/modules/packages/libcgi-application-dispatch-perl","https://github.com/markstos/CGI--Application--Dispatch.git",1893.6213773148,0,9,0,8,9,0,0,9,1,"1",2,2,-1.02372861169188,1.4142135623731,1,0,0 +"CGI-Application-Plugin-Session",-0.4119679947,2.4410793318,-1.1626629958,"https://salsa.debian.org/perl-team/modules/packages/libcgi-application-plugin-session-perl","https://github.com/frioux/CGI-Application-Plugin-Session",1734.1852083333,2,2,0,2,1,0,0,3,1,"1",1.5,1.33333333333333,-1.13339812140177,1.15470053837925,1,0,0 +"libcgroup",0.8905633465,1.7409188519,0.3692553148,"https://salsa.debian.org/debian/libcgroup","https://github.com/libcgroup/libcgroup",5745.3289930556,43,20,2,31,36,0,0,52,4,"4",1.31746031746032,1.69230769230769,1.62570086508601,1.30088727117598,1,0,1 +"libdnet",0.6447638804,1.8645884536,0.1303098815,"https://salsa.debian.org/debian/libdumbnet","https://github.com/ofalk/libdnet",3068.4848032407,6,20,0,16,42,0,0,44,2,"2",1.76923076923077,1.95454545454545,-0.215588923436322,1.39805059083906,1,1,0 +"libebur128",0.4008800859,2.5097823396,-0.0483144637,"https://salsa.debian.org/multimedia-team/libebur128","https://github.com/jiixyj/libebur128",3690.6439930556,1,22,0,19,70,0,0,71,2,"2",1.95652173913043,1.98591549295775,0.212368507706025,1.40922513920159,1,1,0 +"ejml",-1.6145518294,1.0936860376,-2.2108976925,"https://salsa.debian.org/java-team/libejml-java","https://github.com/lessthanoptimal/ejml",5141.1358564815,14,15,0,17,85,0,0,85,4,"4",1.51724137931034,2,1.21010153476186,1.4142135623731,1,1,0 +"p5-encode",0.0933708639,1.2559525686,-0.1937815459,"https://salsa.debian.org/perl-team/modules/packages/libencode-perl","https://github.com/dankogai/p5-encode.git",5752.78,4,51,0,42,88,0,0,90,4,"4",1.92727272727273,1.97777777777778,1.63082610287651,1.40633487398193,1,1,0 +"libepoxy",0.3100507455,1.1926379346,0.0363222284,"https://salsa.debian.org/xorg-team/lib/libepoxy","https://github.com/anholt/libepoxy.git",3236.6618981482,11,45,0,45,212,0,0,215,2,"2",1.80357142857143,1.98604651162791,-0.0999068943160752,1.4092716245025,1,1,0 +"liberasurecode",-0.4839675188,1.1970872377,-0.8694804348,"https://salsa.debian.org/openstack-team/libs/liberasurecode","https://github.com/openstack/liberasurecode.git",3370.5594560185,7,23,0,19,7,0,0,26,2,"2",1.76666666666667,1.26923076923077,-0.00780433304159595,1.12660142429822,1,1,0 +"perl-error.pm",1.2535323608,3.335171802,0.4397835194,"https://salsa.debian.org/perl-team/modules/packages/liberror-perl","https://github.com/shlomif/perl-error.pm.git",4521.3125694445,0,3,0,2,3,0,0,4,3,"3",2,1.75,0.78375087399049,1.3228756555323,1,0,0 +"libesedb",-0.0038540304,1.3424306865,-0.3777859111,"https://salsa.debian.org/pkg-security-team/libesedb","https://github.com/libyal/libesedb",2793.913912037,0,1,0,1,61,0,2,63,2,"2",2,1.96825396825397,-0.404454820122601,1.4029447488244,1.03174603174603,0,0 +"libesmtp",0.2677621782,0.8388085609,-0.0156401267,"https://github.com/jbouse-debian/libesmtp","https://github.com/jbouse-debian/libesmtp",4730.7607986111,1,4,0,2,1,0,0,2,3,"3",1.8,1.5,0.9278215999057,1.22474487139159,1,1,0 +"libestr",0.2583326289,1.2734255517,0.0106705212,"https://salsa.debian.org/debian/libestr","https://github.com/rsyslog/libestr.git",2916.1839236111,6,7,0,9,8,0,0,13,2,"2",1.53846153846154,1.61538461538462,-0.320350364356924,1.27097781860449,1,0,0 +"libevent",0.7674583301,1.6743727385,0.314106766,"https://salsa.debian.org/debian/libevent","https://github.com/libevent/libevent",5769.2016435185,214,125,1,240,0,0,6,246,4,"4",1.36873156342183,1,1.64212186847857,1,1.02439024390244,1,1 +"libgeotiff",0.3969402517,2.1076539482,-0.0842600623,"https://salsa.debian.org/debian-gis-team/libgeotiff","https://github.com/OSGeo/libgeotiff.git",5753.8535763889,6,17,0,21,54,0,0,58,4,"4",1.73913043478261,1.93103448275862,1.63156457142451,1.3896166675593,1,0,0 +"libglvnd",0.3742764654,1.2232824361,0.0505144955,"https://salsa.debian.org/xorg-team/lib/libglvnd.git","https://github.com/NVIDIA/libglvnd.git",3760.105162037,9,47,0,41,117,0,0,133,2,"2",1.83928571428571,1.8796992481203,0.260147956966058,1.3710212427677,1,0,0 +"libgroove",-0.5717771357,0.9386669616,-0.9657138035,"https://salsa.debian.org/multimedia-team/libgroove","https://github.com/andrewrk/libgroove",3739.9100810185,3,10,1,10,62,0,2,65,2,"2",1.76923076923077,1.95384615384615,0.246256600644599,1.39780046996921,1.03076923076923,1,0 +"hdf4",0.7482393831,1.3419798784,0.3704858112,"https://salsa.debian.org/debian-gis-team/hdf4","https://github.com/HDFGroup/hdf4.git",5770.0810416667,9,27,0,20,22,0,2,34,4,"4",1.75,1.64705882352941,1.64272676989064,1.2833778958395,1.05882352941176,0,0 +"libheif",0.7756133995,3.7562106714,0.0328408592,"https://salsa.debian.org/multimedia-team/libheif","https://github.com/strukturag/libheif.git",2185.1827314815,30,67,0,79,121,0,1,182,1,"1",1.69072164948454,1.66483516483516,-0.823175682164814,1.29028491614649,1.00549450549451,1,0 +"hpptools",-2.8766583863,-0.6777605247,-3.3195064784,"https://salsa.debian.org/med-team/libhpptools","https://github.com/mateidavid/hpptools.git",498.7340625,0,2,0,2,3,0,0,3,1,"1",2,2,-1.98321358234511,1.4142135623731,1,0,0 +"HTML-Clean",-0.1024783024,1.2552104643,-0.471169751,"https://salsa.debian.org/perl-team/modules/packages/libhtml-clean-perl","https://github.com/poizon/HTML-Clean.git",1155.8983796296,1,3,0,2,2,0,0,2,1,"1",1.75,2,-1.53117757998233,1.4142135623731,1,0,0 +"p5-html-embedded-turtle",-2.1754143328,0.1122982625,-2.6152678827,"https://salsa.debian.org/perl-team/modules/packages/libhtml-embedded-turtle-perl","https://github.com/tobyink/p5-html-embedded-turtle",1183.7536805556,0,1,0,1,0,0,0,1,1,"1",2,1,-1.51201707697419,1,1,0,0 +"p5-html-html5-entities",-0.3934618041,1.0242081172,-0.6537250647,"https://salsa.debian.org/perl-team/modules/packages/libhtml-html5-entities-perl","https://github.com/tobyink/p5-html-html5-entities.git",1072.6158333333,0,1,0,1,1,0,0,2,1,"1",2,1.5,-1.58846417986774,1.22474487139159,1,0,0 +"p5-html-html5-parser",0.8137592838,4.383181915,-0.3515590143,"https://salsa.debian.org/perl-team/modules/packages/libhtml-html5-parser-perl","https://github.com/tobyink/p5-html-html5-parser",4302.9721412037,1,7,0,5,9,0,0,10,3,"3",1.875,1.9,0.633563574157706,1.37840487520902,1,0,0 +"libhtp",0.266072694,2.5728754227,-0.5638059217,"https://salsa.debian.org/pkg-suricata-team/pkg-libhtp","https://github.com/OISF/libhtp",5122.0736226852,15,26,2,25,31,0,0,43,4,"4",1.63414634146341,1.72093023255814,1.19698941692956,1.31184230476004,1,0,0 +"isa-l",-0.6533940488,1.7011237676,-1.0694298788,"https://salsa.debian.org/openstack-team/third-party/libisal","https://github.com/01org/isa-l.git",2846.4837615741,29,18,0,38,96,0,3,119,2,"2",1.38297872340426,1.80672268907563,-0.36829420700021,1.34414384984481,1.02521008403361,1,1 +"libjpeg-turbo",0.8208594826,1.6678864112,0.3714003986,"https://salsa.debian.org/debian/libjpeg-turbo/","https://github.com/libjpeg-turbo/libjpeg-turbo",5541.3943171296,44,10,2,41,501,0,0,509,4,"4",1.18518518518519,1.98428290766208,1.48542268313694,1.40864577082462,1,1,0 +"p5-JSON-WebToken",-0.1644580581,1.9565513103,-0.5873542729,"https://salsa.debian.org/perl-team/modules/packages/libjson-webtoken-perl","https://github.com/xaicron/p5-JSON-WebToken.git",993.7868981481,0,6,0,2,16,0,0,16,1,"1",2,2,-1.64268732589501,1.4142135623731,1,1,0 +"p5-kavorka",-1.1158599676,1.8699475451,-1.8919945693,"https://salsa.debian.org/perl-team/modules/packages/libkavorka-perl","https://github.com/tobyink/p5-kavorka",2218.7228703704,0,8,0,5,29,0,0,29,1,"1",2,2,-0.800104815553776,1.4142135623731,1,0,0 +"p5-latex-table",-0.7020862971,0.7997073577,-0.9848467916,"https://salsa.debian.org/perl-team/modules/packages/liblatex-table-perl","https://github.com/lima1/p5-latex-table.git",556.2399421296,0,2,0,1,0,0,0,1,1,"1",2,1,-1.94365767941103,1,1,0,0 +"liblbfgs",-0.1459606149,2.0255666612,-0.6194709752,"https://salsa.debian.org/science-team/liblbfgs","https://github.com/chokkan/liblbfgs",5534.0610763889,8,10,0,13,32,0,0,32,4,"4",1.55555555555556,2,1.48037845182008,1.4142135623731,1,0,0 +"p5-lexical-underscore",-0.1208593875,2.7968625617,-0.887693709,"https://salsa.debian.org/perl-team/modules/packages/liblexical-underscore-perl","https://github.com/tobyink/p5-lexical-underscore",2933.2191203704,0,1,0,1,4,0,0,4,2,"2",2,2,-0.308632560998135,1.4142135623731,1,0,0 +"liblognorm",0.9012585102,2.3010415095,0.3051975451,"https://salsa.debian.org/debian/liblognorm","https://github.com/rsyslog/liblognorm.git",4686.8326273148,7,31,0,23,111,0,0,111,3,"3",1.81578947368421,2,0.897605237838722,1.4142135623731,1,0,0 +"libmateweather",0.1284830495,0.843121277,-0.0753011191,"https://salsa.debian.org/debian-mate-team/libmateweather","https://github.com/mate-desktop/libmateweather.git",4345.3109837963,19,32,0,32,92,0,0,94,3,"3",1.62745098039216,1.97872340425532,0.662686703109414,1.4066710362609,1,0,0 +"libmaxminddb",0.5075375731,2.425458321,-0.014814615,"https://salsa.debian.org/debian/libmaxminddb","https://github.com/maxmind/libmaxminddb",3984.2393634259,21,43,0,49,64,0,0,98,3,"3",1.671875,1.6530612244898,0.414320552385041,1.28571428571429,1,1,0 +"method-signatures",-1.1413649114,1.1667964397,-1.6439970781,"https://salsa.debian.org/perl-team/modules/packages/libmethod-signatures-perl","https://github.com/evalEmpire/method-signatures.git",4206.6153935185,3,21,0,18,41,0,1,42,3,"3",1.875,1.97619047619048,0.567283774891448,1.4057704208691,1.02380952380952,0,0 +"miglayout",0.0140581375,1.0961315638,-0.2200314501,"https://salsa.debian.org/java-team/libmiglayout-java","https://github.com/mikaelgrev/miglayout",3114.6859375,4,24,0,17,57,0,0,59,2,"2",1.85714285714286,1.96610169491525,-0.183809084679371,1.4021774833862,1,1,0 +"libminc",-0.2431199399,0.9558742118,-0.5877175902,"https://salsa.debian.org/med-team/libminc","https://github.com/BIC-MNI/libminc.git",5746.5411342593,3,34,0,18,29,0,0,33,4,"4",1.91891891891892,1.87878787878788,1.62653464660721,1.37068883368468,1,0,0 +"libmodbus",0.4081348938,2.0101967387,-0.0931762571,"https://salsa.debian.org/debian/libmodbus","https://github.com/stephane/libmodbus.git",5746.5321180556,58,15,0,55,615,0,25,649,4,"4",1.20547945205479,1.94761171032357,1.62652844473567,1.39556859749837,1.03852080123267,1,1 +"MooseX-MultiInitArg",-1.070754038,1.0835902153,-1.5042988332,"https://salsa.debian.org/perl-team/modules/packages/libmoosex-multiinitarg-perl","https://github.com/frodwith/MooseX-MultiInitArg.git",0.0628703704,0,1,0,1,0,0,0,1,1,"1",2,1,-2.32622875573179,1,1,0,0 +"p5-moosex-mungehas",-1.7054687669,0.6551084355,-2.1489172119,"https://salsa.debian.org/perl-team/modules/packages/libmoosex-mungehas-perl","https://github.com/tobyink/p5-moosex-mungehas",2044.5397800926,1,6,0,4,6,0,0,6,1,"1",1.85714285714286,2,-0.919918119100574,1.4142135623731,1,0,0 +"MooseX-Runnable",-1.5770222755,1.133906618,-2.3498416952,"https://salsa.debian.org/perl-team/modules/packages/libmoosex-runnable-perl","https://github.com/moose/MooseX-Runnable",3541.9794097222,1,4,0,4,4,0,0,6,2,"2",1.8,1.66666666666667,0.110108323774421,1.29099444873581,1,0,0 +"p5-moosex-xsaccessor",-1.7969930844,0.6221995894,-2.237446435,"https://salsa.debian.org/perl-team/modules/packages/libmoosex-xsaccessor-perl","https://github.com/tobyink/p5-moosex-xsaccessor",3461.6608333333,0,1,0,1,1,0,0,2,2,"2",2,1.5,0.0548605155171319,1.22474487139159,1,0,0 +"p5-moox-cmd",-1.7714724432,0.7389635101,-2.3287224021,"https://salsa.debian.org/perl-team/modules/packages/libmoox-cmd-perl","https://github.com/Getty/p5-moox-cmd",2141.9085532407,4,4,0,7,9,0,0,11,1,"1",1.5,1.81818181818182,-0.852942189608414,1.34839972492648,1,1,0 +"p5-moox-struct",1.100399874,4.7268638235,0.0231138942,"https://salsa.debian.org/perl-team/modules/packages/libmoox-struct-perl","https://github.com/tobyink/p5-moox-struct",3679.9237037037,1,2,0,2,4,0,0,4,2,"2",1.66666666666667,2,0.204994466516491,1.4142135623731,1,0,0 +"MooX-Types-MooseLike",0.2188487287,2.4276236186,-0.2341829878,"https://salsa.debian.org/perl-team/modules/packages/libmoox-types-mooselike-perl","https://github.com/mateu/MooX-Types-MooseLike.git",1382.0588888889,0,16,0,12,20,0,0,21,1,"1",2,1.95238095238095,-1.37561117165321,1.39727626201154,1,0,0 +"p5-MouseX-NativeTraits",0.451797092,3.5585079183,-0.2632252957,"https://salsa.debian.org/perl-team/modules/packages/libmousex-nativetraits-perl","https://github.com/gfx/p5-MouseX-NativeTraits.git",1010.1283101852,1,4,0,2,2,0,0,4,1,"1",1.8,1.5,-1.6314467481922,1.22474487139159,1,0,0 +"p5-mousex-types",-0.9002059228,2.4281097906,-1.6194395424,"https://salsa.debian.org/perl-team/modules/packages/libmousex-types-perl","https://github.com/yappo/p5-mousex-types.git",984.7711226852,0,8,0,2,5,0,0,7,1,"1",2,1.71428571428571,-1.64888890287085,1.30930734141595,1,0,0 +"libmpdclient",0.2085560362,1.356457434,-0.1176167234,"https://salsa.debian.org/mpd-team/libmpdclient","https://github.com/MusicPlayerDaemon/libmpdclient",5726.394375,18,26,0,31,41,0,0,60,4,"4",1.59090909090909,1.68333333333333,1.61267652881421,1.29743336373524,1,0,0 +"libofx",0.2034150256,0.6532722257,-0.0343613081,"https://salsa.debian.org/debian/libofx","https://github.com/libofx/libofx",5174.00625,8,16,0,16,48,0,0,49,4,"4",1.66666666666667,1.97959183673469,1.23271171138723,1.40697968597087,1,0,0 +"OpenHMD",0.1127945014,1.854847445,-0.28253551,"https://salsa.debian.org/debian/libopenhmd","https://github.com/OpenHMD/OpenHMD",3515.7873958333,18,41,1,36,258,0,18,277,2,"2",1.69491525423729,1.93140794223827,0.0920919267431833,1.38975103606303,1.06498194945848,1,0 +"Pandoc-Elements",-1.2178305762,1.3066890827,-1.790496828,"https://salsa.debian.org/perl-team/modules/packages/libpandoc-elements-perl","https://github.com/nichtich/Pandoc-Elements.git",2600.5557175926,2,3,0,3,9,0,2,12,1,"1",1.6,1.75,-0.53745788033516,1.3228756555323,1.16666666666667,1,0 +"Pandoc-Wrapper",-1.1913578813,0.8972995069,-1.7262399697,"https://salsa.debian.org/perl-team/modules/packages/libpandoc-wrapper-perl","https://github.com/nichtich/Pandoc-Wrapper.git",1879.2412037037,2,4,0,5,16,0,0,17,1,"1",1.66666666666667,1.94117647058824,-1.03362013504914,1.39326109203847,1,1,0 +"params-callbackrequest",-1.3155087057,0.9970633758,-1.7603650909,"https://salsa.debian.org/perl-team/modules/packages/libparams-callbackrequest-perl","https://github.com/theory/params-callbackrequest.git",1199.2313657407,0,2,0,1,0,0,0,1,1,"1",2,1,-1.50137062105056,1,1,1,0 +"Params-Util",0.5669557248,2.7095409025,0.0183304165,"https://salsa.debian.org/perl-team/modules/packages/libparams-util-perl","https://github.com/perl5-utils/Params-Util",4635.8917939815,2,6,0,2,5,0,0,5,3,"3",1.75,2,0.862565157212322,1.4142135623731,1,0,0 +"parse-cpan-packages",-1.3162623238,0.055729798,-1.5930972954,"https://salsa.debian.org/perl-team/modules/packages/libparse-cpan-packages-perl","https://github.com/wchristian/parse-cpan-packages",2213.1126273148,1,3,0,4,6,0,0,8,1,"1",1.75,1.75,-0.80396386842234,1.3228756555323,1,0,0 +"Parse-Method-Signatures",-0.3098675421,2.1520892101,-0.7857930491,"https://salsa.debian.org/perl-team/modules/packages/libparse-method-signatures-perl","https://github.com/ashb/Parse-Method-Signatures.git",3028.8479166667,2,10,0,8,5,0,0,10,2,"2",1.83333333333333,1.5,-0.242853489216884,1.22474487139159,1,0,0 +"perl-Parse-Netstat",-1.2901506305,0.9707747961,-1.7179336241,"https://salsa.debian.org/perl-team/modules/packages/libparse-netstat-perl","https://github.com/perlancar/perl-Parse-Netstat.git",4083.673275463,0,11,0,2,0,0,0,2,3,"3",2,1,0.482717005030049,1,1,0,0 +"Parse-RecDescent",-0.0286467306,0.2229895206,-0.1007582655,"https://salsa.debian.org/perl-team/modules/packages/libparse-recdescent-perl","https://github.com/jtbraun/Parse-RecDescent.git",2082.3553240741,1,5,0,2,7,0,0,7,1,"1",1.83333333333333,2,-0.893906379139958,1.4142135623731,1,0,0 +"perl-pdf-report",-1.1407475711,-0.7317783117,-1.2346814292,"https://salsa.debian.org/perl-team/modules/packages/libpdf-report-perl","https://github.com/hashbangperl/perl-pdf-report.git",159.7184490741,0,1,0,1,2,0,0,2,1,"1",2,2,-2.21640832319923,1.4142135623731,1,0,0 +"PDL-IO-Matlab",-1.8122896746,0.3558570995,-2.2370761422,"https://salsa.debian.org/perl-team/modules/packages/libpdl-io-matlab-perl","https://github.com/jlapeyre/PDL-IO-Matlab.git",3358.4244907408,1,2,0,2,4,0,0,4,2,"2",1.66666666666667,2,-0.016151470964273,1.4142135623731,1,0,0 +"perl-Perinci-Sub-Normalize",-2.9327731106,-0.9162267093,-3.3201523401,"https://salsa.debian.org/perl-team/modules/packages/libperinci-sub-normalize-perl","https://github.com/perlancar/perl-Perinci-Sub-Normalize.git",3147.5333564815,0,11,0,2,0,0,0,2,2,"2",2,1,-0.16121471128249,1,1,0,0 +"p5-perlx-assert",-1.0193446605,1.5425032533,-1.8362395319,"https://salsa.debian.org/perl-team/modules/packages/libperlx-assert-perl","https://github.com/tobyink/p5-perlx-assert",1111.6440162037,0,1,0,1,1,0,0,1,1,"1",2,2,-1.56161831604896,1.4142135623731,1,0,0 +"p5-perlx-define",-2.1678337344,0.0459215725,-2.6131874891,"https://salsa.debian.org/perl-team/modules/packages/libperlx-define-perl","https://github.com/tobyink/p5-perlx-define",0.0109259259,0,1,0,1,1,0,0,1,1,"1",2,2,-2.3262644861548,1.4142135623731,1,0,0 +"libplist",0.2890151668,0.7751330361,0.068106781,"https://salsa.debian.org/imobiledevice-team/libplist","https://github.com/libimobiledevice/libplist.git",5614.0678125,41,20,0,42,98,0,0,127,4,"4",1.32786885245902,1.77165354330709,1.53541175811967,1.33103476412417,1,1,0 +"libpng",0.1677990695,0.4257948453,0.0473446327,"https://salsa.debian.org/debian/libpng1.6","https://github.com/glennrp/libpng",5354.1097106482,66,26,0,71,29,0,1,92,4,"4",1.28260869565217,1.31521739130435,1.35659739148428,1.14682927731391,1.01086956521739,0,0 +"quazip",0.2146838323,0.9284953049,-0.0650262981,"https://salsa.debian.org/debian/libquazip","https://github.com/stachenov/quazip.git",5295.4944097222,19,25,0,36,147,0,0,150,4,"4",1.56818181818182,1.98,1.31627836378112,1.40712472794703,1,0,1 +"rabbitmq-c",0.5937450624,2.3238703606,-0.0094513193,"https://salsa.debian.org/debian/librabbitmq","https://github.com/alanxz/rabbitmq-c.git",5294.5360185185,63,49,0,77,513,0,0,520,4,"4",1.4375,1.98653846153846,1.31561912633148,1.40944615418201,1,1,1 +"librarian-puppet",-1.4485786469,-0.1256063685,-1.863254572,"https://salsa.debian.org/ruby-team/librarian-puppet","https://github.com/voxpupuli/librarian-puppet.git",4114.1364930556,12,65,0,51,102,0,0,135,3,"3",1.84415584415584,1.75555555555556,0.503671385450176,1.32497379429012,1,1,1 +"p5-rdf-trinex-functions",-0.3154319143,2.3378879966,-0.9704018341,"https://salsa.debian.org/perl-team/modules/packages/librdf-trinex-functions-perl","https://github.com/tobyink/p5-rdf-trinex-functions",833.4788657407,0,1,0,1,0,0,0,1,1,"1",2,1,-1.75295655419487,1,1,0,0 +"p5-rdf-vcard",-1.1506651259,1.2441236911,-1.5912534228,"https://salsa.debian.org/perl-team/modules/packages/librdf-vcard-perl","https://github.com/tobyink/p5-rdf-vcard",1350.944537037,0,1,0,1,3,0,0,3,1,"1",2,2,-1.39701344024971,1.4142135623731,1,0,0 +"re-engine-RE2",0.0664274847,1.5519335001,-0.198667675,"https://salsa.debian.org/perl-team/modules/packages/libre-engine-re2-perl","https://github.com/dgl/re-engine-RE2.git",4711.6157638889,4,2,0,5,11,0,0,11,3,"3",1.33333333333333,2,0.914652526760158,1.4142135623731,1,0,0 +"Regexp-Assemble",0.1956519681,1.1975556345,-0.0657051088,"https://salsa.debian.org/perl-team/modules/packages/libregexp-assemble-perl","https://github.com/ronsavage/Regexp-Assemble.git",3022.0175347222,1,7,0,6,10,0,0,10,2,"2",1.875,2,-0.247551824881682,1.4142135623731,1,0,0 +"Regexp--Common",0.425402964,2.6846898207,-0.0434398169,"https://salsa.debian.org/perl-team/modules/packages/libregexp-common-perl","https://github.com/Abigail/Regexp--Common.git",2712.1816087963,4,1,0,3,10,0,0,12,1,"1",1.2,1.83333333333333,-0.460675072284501,1.35400640077266,1,0,0 +"libregf",0.4815110403,3.4273810655,-0.3192521911,"https://salsa.debian.org/pkg-security-team/libregf","https://github.com/libyal/libregf",3351.514375,0,1,0,1,10,0,2,12,2,"2",2,1.83333333333333,-0.0209046521914262,1.35400640077266,1.16666666666667,0,0 +"librelp",0.3314612484,2.0471916806,-0.1848777948,"https://salsa.debian.org/debian/librelp","https://github.com/rsyslog/librelp",5591.5436921296,9,32,1,25,70,0,0,74,4,"4",1.78048780487805,1.94594594594595,1.51991835249253,1.39497166492583,1,0,0 +"libreswan",-0.4685289799,0.1790588169,-0.7335988012,"https://salsa.debian.org/debian/libreswan","https://github.com/libreswan/libreswan.git",5780.1473263889,145,62,0,96,291,0,0,336,4,"4",1.29951690821256,1.86607142857143,1.64965094849538,1.36604224992181,1,1,0 +"rose",-0.5901790776,0.7613087197,-0.8838877593,"https://salsa.debian.org/perl-team/modules/packages/librose-db-object-perl","https://github.com/siracusa/rose.git",5666.5254166667,1,13,0,5,15,0,1,16,4,"4",1.92857142857143,1.9375,1.57149516232004,1.39194109070751,1.0625,1,0 +"librsync",1.0536449912,2.2531278593,0.4172888316,"https://salsa.debian.org/wrar/librsync","https://github.com/librsync/librsync",3224.9778472222,6,27,0,28,97,0,0,99,2,"2",1.81818181818182,1.97979797979798,-0.107943867009696,1.4070529413629,1,1,1 +"libsamplerate",1.1293768908,2.270076752,0.5189548422,"https://salsa.debian.org/multimedia-team/libsamplerate","https://github.com/libsndfile/libsamplerate",5747.2226851852,38,5,1,34,55,0,0,67,4,"4",1.11627906976744,1.82089552238806,1.62700345714351,1.34940561818456,1,1,0 +"libsass-python",-0.2696522517,0.8271709552,-0.6027229138,"https://salsa.debian.org/debian/libsass-python","https://github.com/dahlia/libsass-python.git",4268.9750925926,7,93,0,77,129,0,0,180,3,"3",1.93,1.71666666666667,0.610178418351591,1.31021626713557,1,0,0 +"libseccomp",0.1381369347,0.416274215,0.0228352343,"https://salsa.debian.org/debian/libseccomp","https://github.com/seccomp/libseccomp",4323.2139467593,71,4,2,57,206,0,1,215,3,"3",1.05333333333333,1.95813953488372,0.647487070344967,1.39933539042065,1.0046511627907,1,1 +"libserial",-1.1010178283,1.6867209629,-1.6981926712,"https://salsa.debian.org/debian/libserial","https://github.com/crayzeewulf/libserial.git",5587.6811226852,3,17,0,12,68,0,2,71,4,"4",1.85,1.95774647887324,1.51726145161556,1.3991949395539,1.02816901408451,0,0 +"libsigcplusplus",1.039682316,2.0456143837,0.5117249183,"https://salsa.debian.org/gnome-team/libsigcplusplus","https://github.com/libsigcplusplus/libsigcplusplus.git",5770.9372800926,22,19,0,30,50,0,0,65,4,"4",1.46341463414634,1.76923076923077,1.64331574069296,1.33012434352235,1,1,0 +"smali",0.051369828,1.8568435409,-0.3306485602,"https://salsa.debian.org/android-tools-team/libsmali-java","https://github.com/JesusFreke/smali",4709.8444212963,28,24,0,34,365,0,10,381,3,"3",1.46153846153846,1.95800524934383,0.91343409386065,1.39928740769859,1.0262467191601,0,0 +"libsoundio",0.7102350676,3.6650448533,-0.2050801471,"https://salsa.debian.org/debian-hamradio-team/libsoundio","https://github.com/andrewrk/libsoundio.git",3080.119837963,16,23,0,26,120,0,4,127,2,"2",1.58974358974359,1.94488188976378,-0.207585666950648,1.39459022288405,1.03149606299213,1,0 +"libspiro",0.131579132,1.3992780483,-0.1906866674,"https://salsa.debian.org/fonts-team/libspiro","https://github.com/fontforge/libspiro.git",4925.1799537037,1,10,0,7,21,0,0,21,3,"3",1.90909090909091,2,1.06155445082292,1.4142135623731,1,1,0 +"spreadsheet-parseexcel",0.0390044504,0.8094712372,-0.1827268471,"https://salsa.debian.org/perl-team/modules/packages/libspreadsheet-parseexcel-perl","https://github.com/runrig/spreadsheet-parseexcel.git",1902.0376851852,1,6,0,6,33,0,0,36,1,"1",1.85714285714286,1.91666666666667,-1.01793938354114,1.38443731048635,1,0,0 +"spreadsheet-writeexcel",-0.0847103732,0.3100125622,-0.1871342632,"https://salsa.debian.org/perl-team/modules/packages/libspreadsheet-writeexcel-perl","https://github.com/jmcnamara/spreadsheet-writeexcel",5025.7453819445,1,5,0,5,0,0,1,6,4,"4",1.83333333333333,1,1.13072922640482,1,1.16666666666667,0,0 +"libssh2",0.4762440748,1.2465942901,0.1442247779,"https://salsa.debian.org/debian/libssh2","https://github.com/libssh2/libssh2",5758.7769328704,166,33,1,147,60,0,1,189,4,"4",1.16582914572864,1.31746031746032,1.63495114358629,1.14780674220895,1.00529100529101,1,0 +"libStatGen",-0.975335451,0.4820429389,-1.3209080132,"https://salsa.debian.org/med-team/libstatgen","https://github.com/statgen/libStatGen",3791.9891319445,4,17,0,10,34,0,0,36,3,"3",1.80952380952381,1.94444444444444,0.282079613814674,1.39443337755679,1,1,0 +"statistics--basic",-0.339509548,1.3960758717,-0.6303620815,"https://salsa.debian.org/perl-team/modules/packages/libstatistics-basic-perl","https://github.com/jettero/statistics--basic",2331.8967939815,1,4,0,2,4,0,0,5,1,"1",1.8,1.8,-0.722257180392562,1.34164078649987,1,0,0 +"stb",0.0260953725,0.614834907,-0.1332118971,"https://salsa.debian.org/yangfl-guest/stb","https://github.com/nothings/stb",3489.7656944445,45,185,0,183,533,0,0,592,2,"2",1.80434782608696,1.90033783783784,0.0741926805974867,1.37852741642589,1,0,0 +"p5-String-Diff",-1.3455951871,1.0906833724,-1.8998963909,"https://salsa.debian.org/perl-team/modules/packages/libstring-diff-perl","https://github.com/yappo/p5-String-Diff.git",2495.2807060185,0,3,0,2,16,0,0,16,1,"1",2,2,-0.609872182420992,1.4142135623731,1,1,0 +"string-mkpasswd",-0.4901797022,1.4058339509,-0.8573438246,"https://salsa.debian.org/perl-team/modules/packages/libstring-mkpasswd-perl","https://github.com/sirhc/string-mkpasswd.git",1997.6768055556,0,4,0,2,7,0,0,7,1,"1",2,2,-0.952153210258692,1.4142135623731,1,0,0 +"Switch",1.122027291,3.2876087875,0.2909942207,"https://salsa.debian.org/perl-team/modules/packages/libswitch-perl","https://github.com/chorny/Switch.git",4065.2442592593,3,4,0,4,3,0,0,6,3,"3",1.57142857142857,1.5,0.470040451244253,1.22474487139159,1,0,0 +"Sys-Filesystem",-1.1120417075,0.3703683235,-1.5493480129,"https://salsa.debian.org/perl-team/modules/packages/libsys-filesystem-perl","https://github.com/rehsack/Sys-Filesystem",4021.0829050926,2,3,0,2,3,0,0,3,3,"3",1.6,2,0.439663692378775,1.4142135623731,1,0,0 +"CPAN-Sys-Info-Base",-1.1657354635,0.2469375973,-1.4547896136,"https://salsa.debian.org/perl-team/modules/packages/libsys-info-base-perl","https://github.com/burak/CPAN-Sys-Info-Base.git",4472.8146643519,0,2,0,1,2,0,0,2,3,"3",2,2,0.750391182099756,1.4142135623731,1,0,0 +"tabixpp",-0.5609418279,1.5681864899,-0.9903141087,"https://salsa.debian.org/med-team/libtabixpp","https://github.com/ekg/tabixpp.git",4263.7660069445,1,12,0,9,27,0,0,27,3,"3",1.92307692307692,2,0.606595304979554,1.4142135623731,1,1,0 +"libteam",0.3146115396,1.3119743537,0.0101461881,"https://salsa.debian.org/debian/libteam","https://github.com/jpirko/libteam",4358.8268634259,40,5,0,31,78,0,3,102,3,"3",1.11111111111111,1.76470588235294,0.671983714582689,1.32842232831014,1.02941176470588,0,0 +"TermReadKey",0.6441757313,1.6725134495,0.1757431378,"https://salsa.debian.org/perl-team/modules/packages/libterm-readkey-perl","https://github.com/jonathanstowe/TermReadKey.git",4734.9570717593,8,17,0,18,40,0,0,42,3,"3",1.68,1.95238095238095,0.930708041681815,1.39727626201154,1,0,0 +"Term-Table",-0.9505327372,1.4037764096,-1.390637121,"https://salsa.debian.org/perl-team/modules/packages/libterm-table-perl","https://github.com/exodist/Term-Table.git",2498.9135185185,1,5,0,5,16,0,0,16,1,"1",1.83333333333333,2,-0.607373321790509,1.4142135623731,1,1,0 +"Test-Harness",-1.5063742807,-0.2541479391,-1.8715013961,"https://salsa.debian.org/perl-team/modules/packages/libtest-harness-perl","https://github.com/Perl-Toolchain-Gang/Test-Harness.git",5734.1103356482,27,47,0,51,97,0,2,113,4,"4",1.63513513513514,1.85840707964602,1.61798401723817,1.36323405167492,1.01769911504425,0,0 +"URI",0.1589529919,0.4832194601,0.0298109637,"https://salsa.debian.org/perl-team/modules/packages/liburi-perl","https://github.com/libwww-perl/URI.git",5620.9042939815,27,14,0,37,89,0,1,98,4,"4",1.34146341463415,1.90816326530612,1.54011428940229,1.38136282898669,1.01020408163265,1,0 +"libusbmuxd",0.7289206284,2.7086807014,0.1072945241,"https://salsa.debian.org/imobiledevice-team/libusbmuxd","https://github.com/libimobiledevice/libusbmuxd.git",3636.013275463,9,9,0,14,171,0,0,173,2,"2",1.5,1.98843930635838,0.174790309159527,1.41012031627035,1,1,0 +"libvslvm",0.4972132182,3.5752748687,-0.3065187033,"https://salsa.debian.org/pkg-security-team/libvslvm","https://github.com/libyal/libvslvm",3338.937025463,0,1,0,1,10,0,2,12,2,"2",2,1.83333333333333,-0.0295560878473641,1.35400640077266,1.16666666666667,0,0 +"p5-web-id",-1.7090564746,0.8941936847,-2.3119612886,"https://salsa.debian.org/perl-team/modules/packages/libweb-id-perl","https://github.com/tobyink/p5-web-id",743.3495023148,0,1,0,1,1,0,0,1,1,"1",2,2,-1.81495279482537,1.4142135623731,1,0,0 +"libwfut",-0.3722932827,1.182465359,-1.0373316516,"https://salsa.debian.org/games-team/libwfut","https://github.com/worldforge/libwfut",5568.6978240741,0,9,0,6,3,0,0,6,4,"4",2,1.5,1.50420363001425,1.22474487139159,1,1,0 +"libwmf",1.6375319104,2.6900330531,0.986051197,"https://salsa.debian.org/yangfl-guest/libwmf","https://github.com/caolanm/libwmf",1783.8275231482,5,6,0,8,12,0,0,14,1,"1",1.54545454545455,1.85714285714286,-1.09925123765893,1.36277028773849,1,0,0 +"perl-wfa",-1.3338913453,0.3424607166,-1.6281493484,"https://salsa.debian.org/perl-team/modules/packages/libwww-facebook-api-perl","https://github.com/unobe/perl-wfa.git",3078.4910185185,2,7,0,4,7,0,0,8,2,"2",1.77777777777778,1.875,-0.208706064104101,1.36930639376292,1,0,0 +"p5-www-finger",-1.969235679,0.3956899207,-2.5687445665,"https://salsa.debian.org/perl-team/modules/packages/libwww-finger-perl","https://github.com/tobyink/p5-www-finger",1316.1418171296,0,1,0,1,0,0,0,1,1,"1",2,1,-1.42095278383277,1,1,0,0 +"www-google-calculator-perl",-1.995767031,-0.963482599,-2.1565335627,"https://salsa.debian.org/perl-team/modules/packages/libwww-google-calculator-perl","https://github.com/typester/www-google-calculator-perl.git",8.9802893519,0,2,0,1,1,0,0,2,1,"1",2,1.5,-2.32009483408888,1.22474487139159,1,0,0 +"libx86emu",0.2882621713,2.1510294765,-0.1187700994,"https://salsa.debian.org/debian/libx86emu","https://github.com/wfeldt/libx86emu",5028.2515972222,1,8,0,5,16,0,1,17,4,"4",1.88888888888889,1.94117647058824,1.13245314766114,1.39326109203847,1.05882352941176,1,0 +"libxcrypt",0.6294336301,1.8917972899,0.1100717419,"https://salsa.debian.org/md/libxcrypt","https://github.com/besser82/libxcrypt.git",2976.0054050926,9,14,0,21,95,0,0,97,2,"2",1.60869565217391,1.97938144329897,-0.279201655214544,1.40690491622532,1,1,0 +"libxmlb",0.6508495345,3.3286264453,-0.0130638591,"https://salsa.debian.org/efi-team/libxmlb","https://github.com/hughsie/libxmlb.git",1900.0449074074,20,6,0,18,36,0,0,36,1,"1",1.23076923076923,2,-1.01931013249508,1.4142135623731,1,1,0 +"libxsmm",-0.2346624326,4.5583780245,-1.7957714951,"https://salsa.debian.org/science-team/libxsmm","https://github.com/libxsmm/libxsmm",2814.5005324074,23,91,3,47,120,0,3,130,2,"2",1.79824561403509,1.92307692307692,-0.390294140165049,1.38675049056307,1.02307692307692,1,1 +"xstream",0.3400487245,1.4508992999,-0.0600865184,"https://salsa.debian.org/java-team/libxstream-java","https://github.com/x-stream/xstream.git",5706.9961921296,29,7,0,35,375,0,0,383,4,"4",1.19444444444444,1.97911227154047,1.59933332558593,1.40680925200983,1,0,0 +"light",0.5032985546,2.4196884631,-0.3115474994,"https://salsa.debian.org/debian/light","https://github.com/haikarainen/light.git",3160.1600115741,4,28,0,25,51,0,0,66,2,"2",1.875,1.77272727272727,-0.152529360385467,1.33143804689789,1,0,0 +"light-locker",2.0302690876,3.664096529,1.142878255,"https://salsa.debian.org/xfce-extras-team/light-locker","https://github.com/the-cavalry/light-locker",4227.1496643519,82,214,2,128,275,0,0,390,3,"3",1.72297297297297,1.7051282051282,0.58140844577971,1.30580557707808,1,1,0 +"lightdm",2.2443975037,2.9446010571,1.7397776964,"https://salsa.debian.org/xfce-extras-team/lightdm","https://github.com/canonical/lightdm.git",4834.5447222222,52,64,0,73,415,0,0,449,3,"3",1.55172413793103,1.92427616926503,0.999210244595967,1.38718281753525,1,1,1 +"linux-minidisc",-0.9631872604,1.8387133413,-1.6378120208,"https://github.com/glaubitz/linux-minidisc","https://github.com/glaubitz/linux-minidisc",4847.712349537,36,17,0,20,3,0,0,23,3,"3",1.32075471698113,1.1304347826087,1.00826770778567,1.06321906614239,1,0,0 +"linux_logo",3.6168427209,4.8502382947,2.8124057325,"https://salsa.debian.org/debian/linuxlogo","https://github.com/deater/linux_logo.git",3761.5540393519,1,11,0,8,26,0,0,26,2,"2",1.91666666666667,2,0.261144579412332,1.4142135623731,1,0,0 +"LiTL",-1.9126650133,-1.5671586884,-1.990034954,"https://salsa.debian.org/debian/litl","https://github.com/trahay/LiTL.git",3099.0093171296,0,7,0,3,1,0,0,3,2,"2",2,1.33333333333333,-0.194592379843276,1.15470053837925,1,0,0 +"lksctp-tools",0.0452198518,0.3695750173,-0.0618537574,"https://salsa.debian.org/debian/lksctp-tools","https://github.com/sctp/lksctp-tools",5515.8208912037,27,6,1,22,37,0,1,51,4,"4",1.18181818181818,1.72549019607843,1.46783178703845,1.31357915485837,1.01960784313725,0,0 +"llgal",-0.3872692626,0.4151216759,-0.6843175914,"https://github.com/bgoglin/llgal","https://github.com/bgoglin/llgal",4534.9444212963,2,4,0,1,11,0,0,11,3,"3",1.66666666666667,2,0.793127657932145,1.4142135623731,1,0,0 +"lltag",0.046755981,1.4904215665,-0.4505269549,"https://github.com/bgoglin/lltag","https://github.com/bgoglin/lltag",4379.0269328704,3,3,0,2,9,0,0,9,3,"3",1.5,2,0.685878502234925,1.4142135623731,1,0,0 +"lmodern",0.1884866384,0.5510456421,0.0188158223,"https://github.com/debian-tex/lmodern","https://github.com/debian-tex/lmodern",5129.2031828704,1,7,0,2,1,0,0,3,4,"4",1.875,1.33333333333333,1.20189354486334,1.15470053837925,1,0,0 +"lnav",0.5353667256,1.9342081999,-0.0323395042,"https://salsa.debian.org/carnil/lnav","https://github.com/tstack/lnav",5194.1560648148,17,59,0,51,384,0,4,404,4,"4",1.77631578947368,1.95049504950495,1.24657193096978,1.39660124928519,1.00990099009901,1,0 +"logging-log4cxx",0.4346363558,1.6002502027,-0.0917843487,"https://salsa.debian.org/debian/log4cxx","https://github.com/apache/logging-log4cxx.git",3632.7022222222,22,27,0,28,7,0,0,31,2,"2",1.55102040816327,1.2258064516129,0.172512773341516,1.10716143882132,1,1,0 +"logbook",-0.4896324695,1.3303979826,-1.0513067414,"https://salsa.debian.org/debian/logbook","https://github.com/getlogbook/logbook.git",4893.8917824074,11,77,0,65,189,0,0,192,3,"3",1.875,1.984375,1.04003261905975,1.40867845869808,1,1,0 +"logging_tree",-1.6414264559,0.7777898237,-2.2813478865,"https://salsa.debian.org/debian/python-logging-tree","https://github.com/brandon-rhodes/logging_tree.git",3349.1260532407,5,7,0,10,25,0,0,25,2,"2",1.58333333333333,2,-0.0225474793996132,1.4142135623731,1,1,0 +"redis-lua",-0.3995562839,2.3401321656,-1.0679040964,"https://salsa.debian.org/lua-team/lua-redis","https://github.com/nrk/redis-lua",2064.0116898148,2,10,0,8,80,0,0,80,1,"1",1.83333333333333,2,-0.906524202237227,1.4142135623731,1,0,0 +"lxctl",1.456465586,5.0051312044,0.180488606,"https://salsa.debian.org/debian/lxctl","https://github.com/lxctl/lxctl",2540.4811342593,0,29,1,12,21,0,5,28,1,"1",2,1.75,-0.578780687714916,1.3228756555323,1.17857142857143,1,0 +"lxde-icon-theme",0.3420036946,2.5520871,-0.0935522829,"https://salsa.debian.org/lxde-team/lxde-icon-theme","https://github.com/lxde/lxde-icon-theme",1739.474375,0,4,0,3,0,0,0,3,1,"1",2,1,-1.1297599236276,1,1,0,0 +"lxhotkey",1.1410291912,4.8144910554,0.0876782474,"https://salsa.debian.org/lxde-team/lxhotkey","https://github.com/lxde/lxhotkey.git",2759.3632291667,8,4,0,8,27,0,0,32,2,"2",1.33333333333333,1.84375,-0.428220797910033,1.35784756140003,1,0,0 +"lxinput",0.7555106667,3.0338681034,0.062981082,"https://salsa.debian.org/lxde-team/lxinput","https://github.com/lxde/lxinput.git",5254.8770717593,78,26,0,55,0,0,0,55,4,"4",1.25,1,1.288339386267,1,1,0,0 +"lxqt-globalkeys",0.2347991986,1.8204555607,-0.1421664419,"https://salsa.debian.org/lxqt-team/lxqt-globalkeys","https://github.com/lxqt/lxqt-globalkeys.git",4146.0372916667,56,46,0,78,0,0,0,78,3,"3",1.45098039215686,1,0.525614618064095,1,1,1,0 +"lxqt-openssh-askpass",0.2639701586,2.0558849821,-0.1403263445,"https://salsa.debian.org/lxqt-team/lxqt-openssh-askpass","https://github.com/lxqt/lxqt-openssh-askpass.git",4154.121712963,34,30,0,50,29,0,0,59,3,"3",1.46875,1.49152542372881,0.53117555524364,1.22128023963741,1,1,0 +"lz4",0.2140600439,0.6954425453,0.0384684269,"https://salsa.debian.org/debian/lz4","https://github.com/lz4/lz4",3549.3137037037,30,172,0,147,393,0,5,456,2,"2",1.85148514851485,1.86184210526316,0.115153279571826,1.36449335112457,1.0109649122807,0,0 +"mako",0.9607195824,2.3152903989,0.3300125847,"https://salsa.debian.org/python-team/packages/mako","https://github.com/sqlalchemy/mako",5744.8817476852,23,45,7,53,64,0,6,98,4,"4",1.66176470588235,1.6530612244898,1.62539322359659,1.28571428571429,1.06122448979592,0,0 +"variant",0.159782488,3.7315023577,-0.6830233266,"https://salsa.debian.org/debian-gis-team/mapbox-variant/","https://github.com/mapbox/variant.git",2484.9211689815,4,25,0,18,52,0,1,55,1,"1",1.86206896551724,1.94545454545455,-0.616998077096754,1.39479552101896,1.01818181818182,1,0 +"mapcache",-0.6849497052,1.4775793478,-1.119704947,"https://salsa.debian.org/debian-gis-team/mapcache","https://github.com/mapserver/mapcache.git",4429.8413773148,24,38,0,33,160,0,2,163,3,"3",1.61290322580645,1.98159509202454,0.72083164520115,1.40769140511141,1.01226993865031,1,0 +"mate-common",0.2236781765,1.5441453615,-0.2936941102,"https://salsa.debian.org/debian-mate-team/mate-common","https://github.com/mate-desktop/mate-common.git",4289.5348032407,4,19,0,14,26,0,0,28,3,"3",1.82608695652174,1.92857142857143,0.624320588230346,1.38873014965883,1,0,0 +"mate-control-center",0.442807422,1.1267913622,0.085872745,"https://salsa.debian.org/debian-mate-team/mate-control-center","https://github.com/mate-desktop/mate-control-center.git",4382.2688194445,31,51,0,48,319,0,0,321,3,"3",1.6219512195122,1.99376947040498,0.688108461179547,1.41200901923642,1,0,0 +"mate-desktop",1.4429678874,2.800379976,0.7048624548,"https://salsa.debian.org/debian-mate-team/mate-desktop","https://github.com/mate-desktop/mate-desktop.git",4339.3214814815,30,45,0,44,57,0,0,90,3,"3",1.6,1.63333333333333,0.658566773569796,1.27801930084539,1,0,0 +"dock-applet",0.3881982435,2.2401761238,-0.1688322569,"https://salsa.debian.org/debian-mate-team/mate-dock-applet","https://github.com/robint99/dock-applet.git",2711.5333680556,9,12,0,13,168,0,0,169,1,"1",1.57142857142857,1.99408284023669,-0.461120970129769,1.41211998082199,1,1,0 +"mate-icon-theme",0.4087889597,2.4988457726,-0.055212655,"https://salsa.debian.org/debian-mate-team/mate-icon-theme","https://github.com/mate-desktop/mate-icon-theme.git",3997.7458217593,7,25,0,19,36,0,0,38,3,"3",1.78125,1.94736842105263,0.423611083340491,1.39548142984872,1,0,0 +"mate-icon-theme-faenza",0.5142431191,2.3829279771,-0.0287099151,"https://salsa.debian.org/debian-mate-team/mate-icon-theme-faenza","https://github.com/mate-desktop/mate-icon-theme-faenza.git",2081.9641898148,2,15,0,10,19,0,0,20,1,"1",1.88235294117647,1.95,-0.8941754241297,1.39642400437689,1,0,0 +"mate-netbook",-0.1990739498,0.92545311,-0.5547977915,"https://salsa.debian.org/debian-mate-team/mate-netbook","https://github.com/mate-desktop/mate-netbook.git",4033.4643981482,4,20,0,14,35,0,0,37,3,"3",1.83333333333333,1.94594594594595,0.448180406506807,1.39497166492583,1,0,0 +"mate-notification-daemon",0.294431484,1.2443680719,-0.0375475363,"https://salsa.debian.org/debian-mate-team/mate-notification-daemon","https://github.com/mate-desktop/mate-notification-daemon.git",4376.8075462963,19,34,0,34,136,0,0,140,3,"3",1.64150943396226,1.97142857142857,0.684351878514642,1.40407570003493,1,0,0 +"mate-polkit",0.0844204987,0.7139928108,-0.078912062,"https://salsa.debian.org/debian-mate-team/mate-polkit","https://github.com/mate-desktop/mate-polkit.git",4293.1045717593,9,23,0,18,42,0,0,47,3,"3",1.71875,1.8936170212766,0.626776083528016,1.37608757761873,1,0,0 +"mate-settings-daemon",0.1815646983,0.7203109893,-0.0328315734,"https://salsa.debian.org/debian-mate-team/mate-settings-daemon","https://github.com/mate-desktop/mate-settings-daemon.git",4342.2338425926,28,45,0,46,189,0,0,200,3,"3",1.61643835616438,1.945,0.660570065653348,1.39463256809814,1,0,0 +"selinux",-1.9181882041,-0.1416609992,-2.339014847,"https://salsa.debian.org/selinux-team/mcstrans","https://github.com/SELinuxProject/selinux.git",5593.8026157407,179,30,0,124,83,0,12,182,4,"4",1.14354066985646,1.45604395604396,1.52147217209622,1.20666646429076,1.06593406593407,0,1 +"mdbtools",0.6161871039,1.1807658317,0.2302864182,"https://salsa.debian.org/debian/mdbtools","https://github.com/mdbtools/mdbtools",4863.4037152778,30,60,0,60,195,0,0,220,3,"3",1.66666666666667,1.88636363636364,1.01906114567661,1.3734495390671,1,1,0 +"mdk4",-0.0590321422,2.244566977,-0.6808566672,"https://salsa.debian.org/pkg-security-team/mdk4","https://github.com/aircrack-ng/mdk4",1545.4045949074,4,9,0,11,96,0,0,97,1,"1",1.69230769230769,1.98969072164948,-1.26325245401278,1.41056397290215,1,1,0 +"metapixel",1.7970234478,4.4178259899,0.5633223634,"https://salsa.debian.org/debian/metapixel","https://github.com/schani/metapixel.git",3264.7618171296,2,6,0,4,25,0,0,25,2,"2",1.75,2,-0.0805781287212672,1.4142135623731,1,1,0 +"metastore",-0.4597261727,0.6466323956,-0.8107792072,"https://salsa.debian.org/rfrancoise/metastore","https://github.com/przemoc/metastore",5431.9336689815,7,2,1,8,30,0,2,33,4,"4",1.22222222222222,1.90909090909091,1.41012925573201,1.38169855941551,1.06060606060606,1,0 +"meteo-qt",0.8698899777,3.6161721459,0.0040074202,"https://salsa.debian.org/lxqt-team/meteo-qt","https://github.com/dglent/meteo-qt.git",3275.9305092593,3,17,0,16,53,0,0,53,2,"2",1.85,2,-0.0728956499099067,1.4142135623731,1,1,0 +"Mew",-0.487761537,-0.3514010061,-0.554001036,"https://salsa.debian.org/debian/mew","https://github.com/kazu-yamamoto/Mew",5007.0253703704,7,24,0,25,45,0,0,46,4,"4",1.7741935483871,1.97826086956522,1.11785250900619,1.40650661909755,1,1,0 +"Mew",-0.8388830323,-0.1260459264,-1.0270915103,"https://salsa.debian.org/debian/mew-beta","https://github.com/kazu-yamamoto/Mew",5007.0253703704,7,24,0,25,45,0,0,46,4,"4",1.7741935483871,1.97826086956522,1.11785250900619,1.40650661909755,1,1,0 +"mg",0.8626842283,2.0640170714,0.2148718944,"https://salsa.debian.org/debian/mg","https://github.com/hboetes/mg.git",2838.9768518519,3,9,0,3,25,0,0,25,2,"2",1.75,2,-0.373457897986573,1.4142135623731,1,1,0 +"mhc",-0.8884000458,-0.3595274014,-1.157500378,"https://salsa.debian.org/debian/mhc","https://github.com/yoshinari-nomura/mhc",4808.1619907407,0,12,0,8,12,0,0,12,3,"3",2,2,0.981062660864704,1.4142135623731,1,0,0 +"mhwaveedit",-0.0845847669,0.9517864727,-0.4200690155,"https://salsa.debian.org/multimedia-team/mhwaveedit","https://github.com/magnush/mhwaveedit",4171.9324305556,3,7,0,6,15,0,0,16,3,"3",1.7,1.9375,0.543426807129831,1.39194109070751,1,0,0 +"micro-httpd",-0.3300074474,1.1160734611,-0.9308283084,"https://github.com/sudipm-mukherjee/micro-httpd.git","https://github.com/sudipm-mukherjee/micro-httpd.git",4120.3943287037,0,4,0,1,1,0,0,2,3,"3",2,1.5,0.507975890329817,1.22474487139159,1,0,0 +"MilkyTracker",0.2927952476,1.359126964,-0.1661437741,"https://salsa.debian.org/multimedia-team/milkytracker","https://github.com/milkytracker/MilkyTracker",5764.1453472222,35,32,1,44,68,0,5,92,4,"4",1.47761194029851,1.73913043478261,1.63864385254714,1.31876094679157,1.05434782608696,1,0 +"miller",-0.6485962999,1.145337313,-1.0224618063,"https://salsa.debian.org/debian/miller","https://github.com/johnkerl/miller.git",3146.11875,32,28,0,52,128,0,1,155,2,"2",1.46666666666667,1.8258064516129,-0.162187760247788,1.351224056777,1.00645161290323,1,0 +"mimetic",-1.0569767141,-0.8952643698,-1.0963723389,"https://git.toastfreeware.priv.at/debian/mimetic.git","https://github.com/tat/mimetic.git",2612.777962963,3,10,0,8,26,0,0,26,1,"1",1.76923076923077,2,-0.529050706066684,1.4142135623731,1,1,0 +"Minder",-0.4197168251,2.1005562235,-0.9632919414,"https://salsa.debian.org/yangfl-guest/Minder","https://github.com/phase1geo/Minder.git",2148.0431712963,20,27,0,36,96,0,1,112,1,"1",1.57446808510638,1.85714285714286,-0.848722440986047,1.36277028773849,1.00892857142857,1,0 +"minimodem",-0.3250415773,2.1360118932,-0.8562976169,"https://github.com/kamalmostafa/minimodem","https://github.com/kamalmostafa/minimodem",3742.1687037037,10,6,0,12,71,0,0,76,2,"2",1.375,1.93421052631579,0.247810213253883,1.3907589749183,1,0,0 +"mininet",-0.586251107,1.2693023429,-1.2259353746,"https://salsa.debian.org/debian/mininet","https://github.com/mininet/mininet",5029.9877777778,22,77,1,61,58,0,97,202,4,"4",1.77777777777778,1.28712871287129,1.13364739405778,1.13451695133713,1.48019801980198,1,0 +"mootools-core",0.7471893128,2.8560605859,0.0458469775,"https://salsa.debian.org/js-team/mootools","https://github.com/mootools/mootools-core.git",2900.1052662037,27,88,0,63,54,0,136,231,2,"2",1.76521739130435,1.23376623376623,-0.331410204077906,1.11075030216797,1.58874458874459,1,0 +"mopidy-internetarchive",-0.2187337791,2.3088703355,-0.8028100126,"https://salsa.debian.org/mopidy-team/mopidy-internetarchive","https://github.com/tkem/mopidy-internetarchive",2991.6193171296,0,3,1,2,13,0,0,13,2,"2",2,2,-0.268461494505152,1.4142135623731,1,0,0 +"mopidy-mpris",-0.2110446145,2.461940178,-1.1114345149,"https://salsa.debian.org/mopidy-team/mopidy-mpris","https://github.com/mopidy/mopidy-mpris.git",3543.9779050926,2,7,0,6,34,0,0,35,2,"2",1.77777777777778,1.97142857142857,0.11148300562252,1.40407570003493,1,0,0 +"mopidy-podcast",-0.2941570726,1.7690171184,-0.7388669271,"https://salsa.debian.org/mopidy-team/mopidy-podcast","https://github.com/tkem/mopidy-podcast.git",2983.3689236111,2,1,0,3,30,0,0,30,2,"2",1.33333333333333,2,-0.274136597073582,1.4142135623731,1,0,0 +"mopidy-podcast-itunes",-0.2467767179,2.4591937682,-0.834541946,"https://salsa.debian.org/mopidy-team/mopidy-podcast-itunes","https://github.com/tkem/mopidy-podcast-itunes",2949.6816087963,0,2,0,1,9,0,0,9,2,"2",2,2,-0.297308699883016,1.4142135623731,1,0,0 +"mopidy-scrobbler",-0.2517299962,2.1335156702,-1.0325443783,"https://salsa.debian.org/mopidy-team/mopidy-scrobbler","https://github.com/mopidy/mopidy-scrobbler.git",3546.3970023148,0,2,0,1,49,0,0,49,2,"2",2,2,0.113147001991687,1.4142135623731,1,0,0 +"mopidy-somafm",-0.2746325835,2.1609819918,-0.859324666,"https://salsa.debian.org/mopidy-team/mopidy-somafm","https://github.com/AlexandrePTJ/mopidy-somafm",2714.300787037,0,6,2,4,27,0,0,27,1,"1",2,2,-0.459217377709111,1.4142135623731,1,0,0 +"mopidy-soundcloud",-0.2546570011,2.1558962885,-0.9457836601,"https://salsa.debian.org/mopidy-team/mopidy-soundcloud","https://github.com/mopidy/mopidy-soundcloud",3733.2794212963,4,17,2,16,160,0,0,161,2,"2",1.80952380952381,1.99378881987578,0.241695645590096,1.41201587097163,1,0,0 +"mopidy-tunein",-0.3236002892,2.6224531521,-1.0905202326,"https://salsa.debian.org/mopidy-team/mopidy-tunein","https://github.com/kingosticks/mopidy-tunein",2521.2538657407,2,14,1,8,41,0,0,41,1,"1",1.875,2,-0.592006326068907,1.4142135623731,1,0,0 +"mp3fs",0.9163678404,4.5727174058,-0.2047299256,"https://salsa.debian.org/multimedia-team/mp3fs","https://github.com/khenriks/mp3fs.git",5444.4987847222,4,13,0,8,77,0,1,80,4,"4",1.76470588235294,1.9625,1.41877227626828,1.40089257261219,1.0125,1,0 +"mpDris2",-0.9856715769,-0.7754968336,-1.0277106449,"https://salsa.debian.org/debian/mpdris2","https://github.com/eonpatapon/mpDris2.git",4512.1038657407,12,20,0,28,118,0,0,119,3,"3",1.625,1.99159663865546,0.777416589701607,1.41123939806663,1,1,0 +"mpv",0.5363042562,0.8628802276,0.3101358986,"https://salsa.debian.org/multimedia-team/mpv","https://github.com/mpv-player/mpv",5787.7142361111,512,145,0,277,26,0,383,675,4,"4",1.220700152207,1.03851851851852,1.65485591098635,1.01907728780428,1.56740740740741,0,0 +"mrboom-libretro",-0.241313948,1.6810544874,-0.7335121433,"https://salsa.debian.org/games-team/mrboom","https://github.com/Javanaise/mrboom-libretro",2489.0620833333,22,22,0,31,43,0,0,54,1,"1",1.5,1.7962962962963,-0.614149714334317,1.34025978686831,1,1,0 +"msktutil",-0.1662803901,1.2423651932,-0.5841886377,"https://salsa.debian.org/debian/msktutil","https://github.com/msktutil/msktutil",4695.5949305556,8,21,2,11,34,0,1,38,3,"3",1.72413793103448,1.89473684210526,0.903632461814853,1.37649440322337,1.02631578947368,0,0 +"mtr",2.0179049728,2.8158196867,1.452557991,"https://salsa.debian.org/debian/mtr","https://github.com/traviscross/mtr",3917.0060648148,16,90,0,75,432,0,0,433,3,"3",1.84905660377358,1.99769053117783,0.368073562495857,1.41339680598826,1,0,0 +"mupen64plus-ui-console",0.7264116732,3.6995007165,-0.1670734867,"https://salsa.debian.org/games-team/mupen64plus-ui-console","https://github.com/mupen64plus/mupen64plus-ui-console.git",4990.6788773148,5,31,0,19,34,0,0,39,4,"4",1.86111111111111,1.87179487179487,1.10660843628207,1.36813554584145,1,0,0 +"mupen64plus-video-glide64mk2",0.1293389165,2.4637475631,-0.3196538821,"https://salsa.debian.org/games-team/mupen64plus-video-glide64mk2","https://github.com/mupen64plus/mupen64plus-video-glide64mk2.git",4126.6609027778,7,35,0,24,59,0,0,64,3,"3",1.83333333333333,1.921875,0.512286406009274,1.38631706330118,1,0,0 +"mupen64plus-video-rice",0.1071841352,2.1766235067,-0.3149398833,"https://salsa.debian.org/games-team/mupen64plus-video-rice","https://github.com/mupen64plus/mupen64plus-video-rice.git",4977.9831481482,5,34,0,21,49,0,0,56,3,"3",1.87179487179487,1.875,1.09787557220232,1.36930639376292,1,0,0 +"muse",0.3513323565,0.8924420388,0.0076925385,"https://salsa.debian.org/multimedia-team/muse","https://github.com/muse-sequencer/muse.git",5773.0492476852,5,55,0,31,49,0,5,76,4,"4",1.91666666666667,1.64473684210526,1.64476847536341,1.28247294010644,1.06578947368421,0,0 +"python-musicbrainz-ngs",0.5076678121,2.1969185222,-0.005881406,"https://salsa.debian.org/python-team/packages/musicbrainzngs","https://github.com/alastair/python-musicbrainz-ngs",3992.7430092593,1,28,3,24,83,0,3,88,3,"3",1.96551724137931,1.94318181818182,0.420169856688155,1.39398056592688,1.03409090909091,0,1 +"mypaint",0.3480815429,1.0170198092,-0.0287146792,"https://salsa.debian.org/python-team/packages/mypaint","https://github.com/mypaint/mypaint",5559.7677199074,333,53,2,235,44,0,30,291,4,"4",1.13730569948187,1.15120274914089,1.49806098276002,1.07294116760468,1.10309278350515,1,1 +"mysecureshell",-0.4842069771,1.8606131049,-0.9637054818,"https://github.com/mysecureshell/mysecureshell","https://github.com/mysecureshell/mysecureshell",2575.5671990741,3,14,1,9,102,0,0,104,1,"1",1.82352941176471,1.98076923076923,-0.554646442954338,1.40739803565631,1,1,0 +"MySQLTuner-perl",1.4500845033,4.4623073775,0.3464758377,"https://salsa.debian.org/debian/mysqltuner","https://github.com/major/MySQLTuner-perl",4651.9533217593,46,119,0,115,371,0,0,407,3,"3",1.72121212121212,1.91154791154791,0.873613214173521,1.38258739743566,1,1,1 +"n2n",0.1542450391,2.8427672865,-0.655319557,"https://github.com/leggewie-DM/n2n","https://github.com/leggewie-DM/n2n",3071.9561111111,2,3,0,3,2,0,0,5,2,"2",1.6,1.4,-0.213201155123581,1.18321595661992,1,0,0 +"nabi",-1.1181697355,0.3411872046,-1.5057188398,"https://salsa.debian.org/l10n-korean-team/nabi","https://github.com/libhangul/nabi.git",5305.1766782407,0,3,0,1,5,0,1,6,4,"4",2,1.83333333333333,1.32293839361053,1.35400640077266,1.16666666666667,0,0 +"nadoka",-4.0224516234,-0.7310921121,-5.1260106864,"https://salsa.debian.org/ruby-team/nadoka","https://github.com/nadoka/nadoka",4550.0664351852,0,9,0,8,6,0,4,13,3,"3",2,1.46153846153846,0.803529462363449,1.20894104965398,1.30769230769231,1,0 +"nagvis",0.2016649842,1.2173315085,-0.3600392025,"https://salsa.debian.org/nagios-team/nagvis","https://github.com/NagVis/nagvis",5779.6260648148,42,38,0,37,263,0,0,268,4,"4",1.475,1.98134328358209,1.64929239433777,1.40760196205536,1,0,0 +"ndppd",-0.5295407302,1.6070155277,-1.0766996059,"https://salsa.debian.org/debian/ndppd","https://github.com/DanielAdolfsson/ndppd",4471.5943171296,7,15,1,11,75,0,0,77,3,"3",1.68181818181818,1.97402597402597,0.74955175599964,1.40500034662842,1,1,0 +"netcdf-cxx4",-0.359140508,1.3957561161,-0.7913195086,"https://salsa.debian.org/debian-gis-team/netcdf-cxx","https://github.com/Unidata/netcdf-cxx4.git",4438.9411805556,3,28,0,22,99,0,0,100,3,"3",1.90322580645161,1.99,0.727091021390694,1.41067359796659,1,1,0 +"netcdf-fortran",-0.1482258041,0.751301518,-0.2962965499,"https://salsa.debian.org/debian/netcdf-fortran","https://github.com/Unidata/netcdf-fortran.git",4488.0650115741,7,39,0,30,150,0,0,153,3,"3",1.84782608695652,1.98039215686275,0.760881261693667,1.40726406792142,1,1,0 +"netdiscover",0.2541652433,1.9765761262,-0.2111939526,"https://salsa.debian.org/debian/netdiscover","https://github.com/netdiscover-scanner/netdiscover",5323.4166087963,1,5,0,3,24,0,0,24,4,"4",1.83333333333333,2,1.33548488324305,1.4142135623731,1,1,0 +"debian",0.1730522588,2.4986742151,-0.2783909483,"https://github.com/nm-l2tp/debian.git","https://github.com/nm-l2tp/debian.git",2347.114224537,1,1,0,2,0,0,0,2,1,"1",1.5,1,-0.711789742804674,1,1,0,0 +"NetworkManager-ssh",-0.0086320792,1.1414433729,-0.2761809158,"https://salsa.debian.org/lhw-guest/network-manager-ssh","https://github.com/danfruehauf/NetworkManager-ssh",3197.1808449074,4,7,0,12,101,0,1,103,2,"2",1.63636363636364,1.98058252427184,-0.12706426882782,1.40733170371162,1.00970873786408,1,0 +"nixnote2",-0.3647270032,0.4002965512,-0.4904591503,"https://salsa.debian.org/debian/nixnote2","https://github.com/robert7/nixnote2",4104.4428587963,11,48,0,37,124,0,4,152,3,"3",1.8135593220339,1.81578947368421,0.497003537600372,1.34751232784127,1.02631578947368,1,1 +"nmrpflash",-3.9117966743,-1.8322545897,-4.343551647,"https://salsa.debian.org/debian/nmrpflash","https://github.com/jclehner/nmrpflash",2833.1074768519,10,8,0,14,32,0,0,45,2,"2",1.44444444444444,1.71111111111111,-0.377495196942421,1.30809445802324,1,1,0 +"babel-plugin-add-module-exports",-1.4169325387,1.5441837408,-2.1700991878,"https://salsa.debian.org/js-team/node-babel-plugin-add-module-exports","https://github.com/59naga/babel-plugin-add-module-exports",2579.5546180556,2,7,0,4,98,0,0,98,1,"1",1.77777777777778,2,-0.551903663273275,1.4142135623731,1,1,0 +"base64url",-1.8861246737,0.890181623,-2.5677734916,"https://salsa.debian.org/js-team/node-base64url","https://github.com/brianloveswords/base64url.git",3614.4876388889,6,11,0,12,83,0,0,83,2,"2",1.64705882352941,2,0.159983719009029,1.4142135623731,1,0,0 +"node-bindings",-0.3124286212,2.605717497,-1.0137570127,"https://salsa.debian.org/js-team/node-bindings","https://github.com/TooTallNate/node-bindings",2587.1395949074,4,8,0,8,5,0,0,12,1,"1",1.66666666666667,1.41666666666667,-0.546686273155263,1.19023807142381,1,1,0 +"bluebird",0.0584203533,1.0937802889,-0.1343492494,"https://salsa.debian.org/js-team/node-bluebird","https://github.com/petkaantonov/bluebird.git",3418.3106597222,121,152,0,212,654,0,64,848,2,"2",1.55677655677656,1.77122641509434,0.0250417340189423,1.33087430476899,1.07547169811321,1,0 +"clean-css",0.1880139003,2.7123268564,-0.4696783378,"https://salsa.debian.org/js-team/node-clean-css","https://github.com/GoalSmashers/clean-css.git",4686.8824537037,63,58,0,89,14,0,9,111,3,"3",1.47933884297521,1.12612612612613,0.897639511339372,1.06119089994502,1.08108108108108,1,1 +"co",0.4601096377,2.8630730353,-0.1003269721,"https://salsa.debian.org/js-team/node-co","https://github.com/tj/co",1229.0172106482,17,46,0,49,211,0,49,264,1,"1",1.73015873015873,1.79924242424242,-1.48088217712866,1.34135842497165,1.18560606060606,0,0 +"code",-4.7551646559,-1.4632937686,-5.4545700188,"https://salsa.debian.org/js-team/node-code","https://github.com/hapijs/code.git",3316.1678125,19,23,0,28,93,0,0,93,2,"2",1.54761904761905,2,-0.0452180824755838,1.4142135623731,1,0,0 +"coffeeify",-1.4017605239,1.4637076784,-2.2159952345,"https://salsa.debian.org/js-team/node-coffeeify","https://github.com/jnordberg/coffeeify.git",1705.9137731482,1,13,0,10,64,0,0,69,1,"1",1.92857142857143,1.92753623188406,-1.15284486585976,1.38835738622448,1,1,0 +"colormin",-3.5089164725,-0.6840024754,-4.2685005942,"https://salsa.debian.org/js-team/node-colormin","https://github.com/ben-eb/colormin",2228.6048148148,0,6,0,2,15,0,0,15,1,"1",2,2,-0.793307436959441,1.4142135623731,1,1,0 +"combine-source-map",-2.1067627582,1.451088997,-3.1431542202,"https://salsa.debian.org/js-team/node-combine-source-map","https://github.com/thlorenz/combine-source-map.git",1465.4289583333,4,5,0,8,33,0,0,33,1,"1",1.55555555555556,2,-1.3182643682343,1.4142135623731,1,1,0 +"concat-stream",0.3435827993,2.8106720089,-0.124130821,"https://salsa.debian.org/js-team/node-concat-stream","https://github.com/maxogden/concat-stream.git",2331.5214583333,5,21,0,18,3,0,0,20,1,"1",1.80769230769231,1.15,-0.722515358174792,1.07238052947636,1,0,0 +"constants-browserify",-0.11940227,2.8343540596,-0.9198546616,"https://salsa.debian.org/js-team/node-constants-browserify","https://github.com/juliangruber/constants-browserify",3669.6149189815,0,3,0,1,5,0,0,5,2,"2",2,2,0.197903482247297,1.4142135623731,1,1,0 +"content-disposition",-0.1498091429,2.3260602113,-0.8520258644,"https://salsa.debian.org/js-team/node-content-disposition","https://github.com/jshttp/content-disposition.git",2639.7443518519,6,2,0,6,32,0,0,32,1,"1",1.25,2,-0.510501648679116,1.4142135623731,1,1,0 +"convert-source-map",0.0871772545,2.7765163193,-0.5756792774,"https://salsa.debian.org/js-team/node-convert-source-map","https://github.com/thlorenz/convert-source-map",3505.4009953704,16,11,0,22,67,0,0,67,2,"2",1.40740740740741,2,0.0849475538339914,1.4142135623731,1,1,0 +"node-cookie-signature",0.0990081923,2.8247812735,-0.6845514149,"https://salsa.debian.org/js-team/node-cookie-signature","https://github.com/visionmedia/node-cookie-signature.git",3831.3145486111,2,13,0,7,47,0,0,48,3,"3",1.86666666666667,1.97916666666667,0.309129932399935,1.40682858467784,1,0,0 +"core-js",-0.0701104518,1.8860340205,-0.4290715682,"https://salsa.debian.org/js-team/node-core-js","https://github.com/zloirock/core-js.git",3801.3871990741,67,73,0,121,289,0,0,376,3,"3",1.52142857142857,1.7686170212766,0.288544153328562,1.3298936127663,1,1,1 +"d3-dsv",-0.6792934342,2.1613351331,-1.3775271458,"https://salsa.debian.org/js-team/node-d3-dsv","https://github.com/d3/d3-dsv",3863.8892013889,14,6,0,17,65,0,0,65,3,"3",1.3,2,0.331536681269607,1.4142135623731,1,1,0 +"node-dateformat",-0.01865954,1.6506546912,-0.4323251957,"https://salsa.debian.org/js-team/node-dateformat","https://github.com/felixge/node-dateformat",3995.8592476852,8,37,0,33,231,0,3,235,3,"3",1.82222222222222,1.98297872340426,0.422313387497323,1.40818277343683,1.01276595744681,0,0 +"execa",0.7079961346,3.9551483175,-0.0722137493,"https://salsa.debian.org/js-team/node-execa","https://github.com/sindresorhus/execa",2926.6958680556,49,7,0,53,128,0,0,157,2,"2",1.125,1.81528662420382,-0.31311963496415,1.34732573055064,1,0,0 +"node-expat",-0.4080781453,2.3530029048,-1.5150203534,"https://salsa.debian.org/js-team/node-expat","https://github.com/astro/node-expat",4931.3002893519,7,34,0,29,341,0,1,344,3,"3",1.82926829268293,1.99127906976744,1.06576437517124,1.4111268794008,1.00290697674419,1,0 +"node-formidable",-1.0478352411,1.3329643424,-1.6311123883,"https://salsa.debian.org/js-team/node-formidable","https://github.com/felixge/node-formidable.git",4861.6687384259,45,72,0,80,292,0,0,334,3,"3",1.61538461538462,1.87425149700599,1.01786772725768,1.3690330518311,1,1,0 +"fuzzaldrin-plus",-0.9739589777,1.136573322,-1.4594019089,"https://salsa.debian.org/js-team/node-fuzzaldrin-plus","https://github.com/jeancroy/fuzzaldrin-plus",751.1080902778,2,6,0,3,29,0,0,29,1,"1",1.75,2,-1.80961598484444,1.4142135623731,1,1,0 +"grunt-babel",-2.3567896079,-0.2595823007,-2.786480601,"https://salsa.debian.org/js-team/node-grunt-babel","https://github.com/babel/grunt-babel.git",3011.4746296296,8,12,0,13,152,0,0,152,2,"2",1.6,2,-0.254803850816635,1.4142135623731,1,1,0 +"grunt-cli",1.2110710947,4.4921332971,4.42152270994788e-05,"https://salsa.debian.org/js-team/node-grunt-cli","https://github.com/gruntjs/grunt-cli.git",3126.2931944445,8,16,0,20,171,0,0,171,2,"2",1.66666666666667,2,-0.175824935371772,1.4142135623731,1,1,0 +"gulp-babel",-1.6753037226,0.7240298055,-2.2929274971,"https://salsa.debian.org/js-team/node-gulp-babel","https://github.com/babel/gulp-babel.git",3018.4431018519,10,21,0,25,301,0,0,304,2,"2",1.67741935483871,1.99013157894737,-0.250010528592897,1.41072023411709,1,1,0 +"gulp-flatten",-2.894365887,-0.8111009229,-3.321955765,"https://salsa.debian.org/js-team/node-gulp-flatten","https://github.com/armed/gulp-flatten",3247.6037152778,2,7,0,6,17,0,1,18,2,"2",1.77777777777778,1.94444444444444,-0.0923804733815778,1.39443337755679,1.05555555555556,1,0 +"gulp-load-plugins",-1.2725888367,2.2883154102,-2.2151032496,"https://salsa.debian.org/js-team/node-gulp-load-plugins","https://github.com/jackfranklin/gulp-load-plugins",3321.8455787037,10,29,0,26,138,0,0,138,2,"2",1.74358974358974,2,-0.0413125832417217,1.4142135623731,1,1,1 +"node-gyp",0.0377305117,0.6211458053,-0.1173242042,"https://salsa.debian.org/js-team/node-gyp","https://github.com/nodejs/node-gyp.git",4297.5489699074,197,73,0,223,832,0,50,1053,3,"3",1.27037037037037,1.79012345679012,0.62983320017207,1.33795495319914,1.04748338081671,1,1 +"has-flag",0.3334743676,2.4592111562,-0.1192014058,"https://salsa.debian.org/js-team/node-has-flag","https://github.com/sindresorhus/has-flag",2203.7011111111,6,2,0,7,17,0,0,17,1,"1",1.25,2,-0.810437658994956,1.4142135623731,1,0,0 +"inline-source-map",-1.7253778479,0.3256715997,-2.1428170788,"https://salsa.debian.org/js-team/node-inline-source-map","https://github.com/thlorenz/inline-source-map.git",3126.5302314815,5,5,0,9,25,0,0,25,2,"2",1.5,2,-0.175661887452363,1.4142135623731,1,1,0 +"node-ip",0.5473402205,3.0729874251,-0.1357528421,"https://salsa.debian.org/js-team/node-ip","https://github.com/indutny/node-ip",3990.2488194445,6,20,0,17,172,0,0,173,3,"3",1.76923076923077,1.99421965317919,0.41845420724763,1.41216842238424,1,1,0 +"node-is-arrayish",-0.0113184631,2.4802704151,-0.5878636382,"https://salsa.debian.org/js-team/node-is-arrayish","https://github.com/qix-/node-is-arrayish",1162.9688194445,2,9,0,3,10,0,0,10,1,"1",1.81818181818182,2,-1.52631411849246,1.4142135623731,1,1,0 +"is-glob",0.6638373369,3.8445632106,-0.214727985,"https://salsa.debian.org/js-team/node-is-glob","https://github.com/jonschlinkert/is-glob",2500.3032986111,3,9,0,5,18,0,0,18,1,"1",1.75,2,-0.606417349865608,1.4142135623731,1,1,0 +"iscroll",0.3236470898,2.6334834534,-0.1547197624,"https://salsa.debian.org/js-team/node-iscroll","https://github.com/cubiq/iscroll",2222.4944791667,9,37,0,11,375,0,5,391,1,"1",1.80434782608696,1.95907928388747,-0.797510482723591,1.39967113419098,1.01278772378517,1,1 +"jison",-2.8705191059,-0.5904861053,-3.3214497471,"https://salsa.debian.org/js-team/node-jison","https://github.com/zaach/jison",3961.6974305556,7,59,1,40,368,0,51,421,3,"3",1.89393939393939,1.87410926365796,0.398814894280036,1.36898110420048,1.12114014251781,0,1 +"jquery-mousewheel",0.2686821158,2.6543019787,-0.1911219866,"https://salsa.debian.org/js-team/node-jquery-mousewheel","https://github.com/jquery/jquery-mousewheel",5390.8646296296,6,15,1,14,292,0,0,293,4,"4",1.71428571428571,1.99658703071672,1.38187957161861,1.41300638028168,1,1,0 +"millstone",-1.4457365806,1.0910699973,-2.0387356121,"https://salsa.debian.org/js-team/node-millstone","https://github.com/mapbox/millstone",4176.2971875,3,21,0,13,36,0,0,37,3,"3",1.875,1.97297297297297,0.546429141902129,1.40462556326338,1,1,0 +"mqtt-packet",-2.1961592069,0.0425211631,-2.6185433222,"https://salsa.debian.org/js-team/node-mqtt-packet","https://github.com/mqttjs/mqtt-packet",3391.8497337963,19,27,0,34,71,0,0,77,2,"2",1.58695652173913,1.92207792207792,0.00684036358147407,1.38639024883974,1,1,1 +"on-finished",0.0613223619,2.8531731142,-0.6913305342,"https://salsa.debian.org/js-team/node-on-finished","https://github.com/jshttp/on-finished",3350.0634259259,5,3,0,7,4,0,0,9,2,"2",1.375,1.44444444444444,-0.0219026997146896,1.20185042515466,1,1,0 +"once",-0.1226053888,-0.1171397715,-0.1237821835,"https://salsa.debian.org/js-team/node-once","https://github.com/isaacs/once.git",4074.419212963,2,6,0,6,15,0,0,15,3,"3",1.75,2,0.476351520311727,1.4142135623731,1,1,0 +"os-browserify",-0.3268262004,2.3252681953,-0.9671784701,"https://salsa.debian.org/js-team/node-os-browserify","https://github.com/CoderPuppy/os-browserify",1580.0713425926,1,7,0,3,9,0,0,9,1,"1",1.875,2,-1.2394066400663,1.4142135623731,1,1,0 +"parse-glob",0.6847833884,3.868282575,-0.2490532696,"https://salsa.debian.org/js-team/node-parse-glob","https://github.com/micromatch/parse-glob",1589.2864351852,1,5,0,3,6,0,0,6,1,"1",1.83333333333333,2,-1.23306796112653,1.4142135623731,1,1,0 +"parseurl",0.275713727,3.6232142368,-0.6473483724,"https://salsa.debian.org/js-team/node-parseurl","https://github.com/expressjs/parseurl.git",3251.1265972222,2,3,0,5,12,0,0,12,2,"2",1.6,2,-0.0899572294082922,1.4142135623731,1,1,0 +"FlashPolicyFileServer",-0.9515002748,1.7831825682,-1.7365256836,"https://salsa.debian.org/js-team/node-policyfile","https://github.com/3rd-Eden/FlashPolicyFileServer",2142.8337037037,0,3,0,3,14,0,0,14,1,"1",2,2,-0.85230581708182,1.4142135623731,1,1,0 +"react-audio-player",-4.8100583491,-2.4298503474,-5.420558223,"https://salsa.debian.org/js-team/node-react-audio-player","https://github.com/justinmc/react-audio-player.git",2489.7878125,9,20,0,18,119,0,0,119,1,"1",1.68965517241379,2,-0.613650515423539,1.4142135623731,1,1,0 +"regenerate-unicode-properties",-0.6674866267,0.9618352502,-1.0118784845,"https://salsa.debian.org/js-team/node-regenerate-unicode-properties","https://github.com/mathiasbynens/regenerate-unicode-properties",2664.7656597222,3,2,0,4,7,0,0,7,1,"1",1.4,2,-0.493290531628541,1.4142135623731,1,1,0 +"regjsparser",-0.7798404163,1.2003365063,-1.1962820592,"https://salsa.debian.org/js-team/node-regjsparser","https://github.com/jviereck/regjsparser.git",3676.996875,2,16,0,12,27,0,0,27,2,"2",1.88888888888889,2,0.202981222777695,1.4142135623731,1,1,0 +"node-resolve",0.5575663073,3.2984179044,-0.1407771771,"https://salsa.debian.org/js-team/node-resolve","https://github.com/substack/node-resolve.git",4523.8015162037,39,26,0,50,258,0,0,259,3,"3",1.4,1.996138996139,0.785462916951126,1.4128478319122,1,0,0 +"sprintf.js",0.4014290609,3.1578856064,-0.2132993373,"https://salsa.debian.org/js-team/node-sprintf-js","https://github.com/alexei/sprintf.js",3813.8363078704,3,28,0,21,190,0,0,191,3,"3",1.90322580645161,1.99476439790576,0.29710737751249,1.41236128448275,1,1,0 +"static-module",-2.9295084562,0.0141965632,-3.6919322552,"https://salsa.debian.org/js-team/node-static-module","https://github.com/substack/static-module.git",3102.503912037,8,14,0,17,66,0,0,66,2,"2",1.63636363636364,2,-0.192188593346288,1.4142135623731,1,0,0 +"node-stringprep",-1.25858701,1.4295408548,-2.2227266177,"https://salsa.debian.org/js-team/node-stringprep","https://github.com/node-xmpp/node-stringprep",2104.0097800926,2,22,0,18,115,0,1,118,1,"1",1.91666666666667,1.97457627118644,-0.879011179451243,1.40519616822223,1.00847457627119,0,0 +"tape",-1.3533456222,0.8230887097,-1.8448352117,"https://salsa.debian.org/js-team/node-tape","https://github.com/ljharb/tape.git",4022.1372916667,54,62,0,96,488,0,0,500,3,"3",1.53448275862069,1.976,0.440388961051278,1.40570267126445,1,0,0 +"node-tar",0.10092401,1.1554569611,-0.1194951399,"https://salsa.debian.org/js-team/node-tar","https://github.com/npm/node-tar",4544.3033449074,24,18,1,38,142,0,0,162,3,"3",1.42857142857143,1.87654320987654,0.799565272247632,1.36986977843755,1,1,0 +"node-temp",-0.8998725735,2.4095798708,-1.9534582368,"https://salsa.debian.org/js-team/node-temp","https://github.com/bruce/node-temp",4595.6285416667,2,39,2,31,105,0,0,109,3,"3",1.95121951219512,1.96330275229358,0.834869740489144,1.40117905789859,1,1,0 +"json-document",-4.9532456218,-2.9019375195,-5.4554167334,"https://salsa.debian.org/js-team/node-trust-json-document","https://github.com/anvilresearch/json-document.git",471.8604513889,0,5,0,4,7,0,0,7,1,"1",2,2,-2.00169882175795,1.4142135623731,1,1,0 +"tunnel-agent",1.1792785071,4.9631632678,0.1110924805,"https://salsa.debian.org/js-team/node-tunnel-agent","https://github.com/mikeal/tunnel-agent",1464.1568634259,0,12,0,9,131,0,0,132,1,"1",2,1.99242424242424,-1.31913938941482,1.41153258638412,1,1,0 +"type-check",-0.619856367,1.5719870744,-1.0599876067,"https://salsa.debian.org/js-team/node-type-check","https://github.com/gkz/type-check.git",3579.125787037,2,5,0,3,20,0,1,21,2,"2",1.71428571428571,1.95238095238095,0.135659771815582,1.39727626201154,1.04761904761905,1,0 +"ultron",-2.7813197419,-0.4758682807,-3.3070168453,"https://salsa.debian.org/js-team/node-ultron","https://github.com/unshiftio/ultron",2972.2796527778,1,7,0,5,13,0,0,13,2,"2",1.875,2,-0.281764445278272,1.4142135623731,1,1,0 +"node-unicode-data",-2.4986839661,-1.5066066307,-2.7694541364,"https://salsa.debian.org/js-team/node-unicode-data","https://github.com/mathiasbynens/node-unicode-data.git",3658.0537962963,6,3,0,7,29,0,0,29,2,"2",1.33333333333333,2,0.189951066777951,1.4142135623731,1,1,0 +"unicode-property-aliases",-2.1224965726,0.5054136483,-2.7508821504,"https://salsa.debian.org/js-team/node-unicode-property-aliases","https://github.com/mathiasbynens/unicode-property-aliases",2644.0663657408,2,1,0,3,4,0,0,4,1,"1",1.33333333333333,2,-0.507528715077017,1.4142135623731,1,0,0 +"unicode-property-aliases-ecmascript",-0.4930241449,2.1362080223,-1.1371319719,"https://salsa.debian.org/js-team/node-unicode-property-aliases-ecmascript","https://github.com/mathiasbynens/unicode-property-aliases-ecmascript",1978.1429398148,1,2,0,2,3,0,0,3,1,"1",1.66666666666667,2,-0.96558974409049,1.4142135623731,1,1,0 +"unicode-property-value-aliases",-2.108074165,0.5458957808,-2.7511821006,"https://salsa.debian.org/js-team/node-unicode-property-value-aliases","https://github.com/mathiasbynens/unicode-property-value-aliases.git",2643.9666898148,2,2,0,3,3,0,0,3,1,"1",1.5,2,-0.507597278001002,1.4142135623731,1,1,0 +"unicode-property-value-aliases-ecmascript",-2.6459525399,-0.0300807748,-3.2844645306,"https://salsa.debian.org/js-team/node-unicode-property-value-aliases-ecmascript","https://github.com/mathiasbynens/unicode-property-value-aliases-ecmascript",1977.9928009259,0,1,0,1,0,0,0,1,1,"1",2,1,-0.965693018387905,1,1,1,0 +"unicode-tr51",-2.8970799304,-0.9087592402,-3.3116008945,"https://salsa.debian.org/js-team/node-unicode-tr51","https://github.com/mathiasbynens/unicode-tr51",1619.1367939815,1,1,0,2,6,0,0,6,1,"1",1.5,2,-1.21253514078365,1.4142135623731,1,1,0 +"utilities",0.7510248514,4.5416704471,-0.5676243448,"https://salsa.debian.org/js-team/node-utilities","https://github.com/mde/utilities.git",3873.0201388889,1,19,0,12,22,0,0,22,3,"3",1.95,2,0.337817473421185,1.4142135623731,1,1,0 +"node-uuid",0.283624179,1.6049599044,-0.0900742762,"https://salsa.debian.org/js-team/node-uuid","https://github.com/kelektiv/node-uuid",4670.2036805556,41,41,2,59,325,0,0,354,3,"3",1.5,1.9180790960452,0.886166876959109,1.38494732609049,1,1,1 +"node-v8flags",0.1190291187,2.504747846,-0.5070823362,"https://salsa.debian.org/js-team/node-v8flags","https://github.com/tkellen/node-v8flags.git",1721.1332407407,15,3,0,11,73,0,0,73,1,"1",1.16666666666667,2,-1.14237602707884,1.4142135623731,1,1,0 +"vhost",-1.6545263406,0.6845370117,-2.2878465779,"https://salsa.debian.org/js-team/node-vhost","https://github.com/expressjs/vhost.git",3246.905150463,1,3,0,2,0,0,0,2,2,"2",1.75,1,-0.0928609870644458,1,1,1,0 +"vue-resource",-1.8045687517,-0.3856069237,-2.0705983161,"https://salsa.debian.org/js-team/node-vue-resource","https://github.com/pagekit/vue-resource",2754.4118518519,8,21,0,22,133,0,6,153,2,"2",1.72413793103448,1.86928104575163,-0.431626644437654,1.36721653213806,1.03921568627451,1,0 +"webpack-merge",-3.8493072011,-1.380862227,-4.3376760901,"https://salsa.debian.org/js-team/node-webpack-merge","https://github.com/survivejs/webpack-merge.git",3033.8957060185,15,23,0,32,63,0,0,78,2,"2",1.60526315789474,1.80769230769231,-0.239381324858777,1.34450448407296,1,1,0 +"node-ytdl-core",-0.1246800443,2.4581193839,-0.8183512675,"https://salsa.debian.org/js-team/node-ytdl-core","https://github.com/fent/node-ytdl-core.git",4096.004525463,70,23,0,76,490,0,0,521,3,"3",1.24731182795699,1.9404990403071,0.491199159049737,1.39301796122918,1,1,0 +"ntirpc",-0.5951678873,1.6658190607,-1.2552045305,"https://salsa.debian.org/debian/libntirpc","https://github.com/nfs-ganesha/ntirpc.git",4521.189837963,43,88,0,41,65,0,0,76,3,"3",1.67175572519084,1.85526315789474,0.783666452108755,1.36208045206395,1,0,0 +"Nuitka",-0.0866725521,0.7058083517,-0.4988086801,"https://github.com/Nuitka/Nuitka","https://github.com/Nuitka/Nuitka",4857.7762847222,166,5,3,152,130,0,0,253,3,"3",1.02923976608187,1.51383399209486,1.01519027024162,1.23037961300359,1,0,1 +"nvidia-xconfig",0.9734320248,2.4417272676,0.2943686593,"https://salsa.debian.org/nvidia-team/nvidia-xconfig","https://github.com/NVIDIA/nvidia-xconfig",5775.9081134259,1,3,0,4,2,0,0,6,4,"4",1.75,1.33333333333333,1.64673497020653,1.15470053837925,1,0,0 +"nvpy",-0.3144467073,2.8922861575,-1.2852911447,"https://github.com/stefanv/nvpy/tree/debian","https://github.com/stefanv/nvpy",2724.1981134259,2,29,0,16,0,0,0,16,1,"1",1.93548387096774,1,-0.452409418514887,1,1,0,0 +"O-Saft",-0.0182736193,2.1999044406,-0.4504212317,"https://salsa.debian.org/pkg-security-team/o-saft","https://github.com/OWASP/O-Saft",4011.0202777778,3,10,0,9,40,0,0,40,3,"3",1.76923076923077,2,0.432742029552472,1.4142135623731,1,1,0 +"oar",-1.4634945941,-0.6606837191,-1.7817291006,"https://github.com/oar-team/oar","https://github.com/oar-team/oar",5765.8415856482,5,46,5,15,43,0,0,45,4,"4",1.90196078431373,1.95555555555556,1.63981062441402,1.3984117975602,1,0,0 +"obconf-debian",0.7475755733,1.7842164637,0.2203904311,"https://github.com/mati75/obconf-debian.git","https://github.com/mati75/obconf-debian.git",3725.6903935185,0,5,0,3,2,0,0,4,2,"2",2,1.5,0.236475469008567,1.22474487139159,1,0,0 +"obs-studio",0.1312922919,0.962234072,-0.1232421438,"https://salsa.debian.org/multimedia-team/obs-studio","https://github.com/jp9000/obs-studio.git",3726.9157986111,426,253,0,412,244,0,264,855,2,"2",1.37260677466863,1.28538011695906,0.237318374207305,1.13374605488137,1.30877192982456,0,0 +"obus",-3.5252462011,-1.6650389666,-4.1632184213,"https://salsa.debian.org/ocaml-team/obus","https://github.com/ocaml-community/obus",5340.5275115741,3,16,1,12,20,0,0,22,4,"4",1.84210526315789,1.90909090909091,1.34725476162336,1.38169855941551,1,0,0 +"ocaml-alsa",-0.6651242782,1.2653797989,-1.038375358,"https://salsa.debian.org/ocaml-team/ocaml-alsa","https://github.com/savonet/ocaml-alsa.git",460.5193634259,2,8,0,5,4,0,0,6,1,"1",1.8,1.66666666666667,-2.00949988449311,1.29099444873581,1,1,0 +"ocaml-duppy",-1.3054931735,1.4664487385,-2.0959619861,"https://salsa.debian.org/ocaml-team/ocaml-duppy","https://github.com/savonet/ocaml-duppy.git",5432.8347337963,2,8,0,6,6,0,0,8,4,"4",1.8,1.75,1.41074906074293,1.3228756555323,1,1,0 +"ocaml-expect",-1.1271032549,2.7923660814,-2.3065192266,"https://salsa.debian.org/ocaml-team/ocaml-expect","https://github.com/gildor478/ocaml-expect.git",3170.2275231482,0,3,0,1,2,0,0,2,2,"2",2,2,-0.145604337880328,1.4142135623731,1,0,0 +"extunix",-2.1872917146,-0.3028149378,-2.608406683,"https://salsa.debian.org/ocaml-team/ocaml-extunix","https://github.com/ygrek/extunix.git",4849.8496064815,10,12,0,18,30,0,0,33,3,"3",1.54545454545455,1.90909090909091,1.00973783794951,1.38169855941551,1,1,0 +"ocaml-ipaddr",-1.0446018994,1.8622042043,-1.7854758695,"https://salsa.debian.org/ocaml-team/ocaml-ipaddr","https://github.com/mirage/ocaml-ipaddr.git",3725.5192476852,9,20,0,22,40,0,0,40,2,"2",1.68965517241379,2,0.236357744907776,1.4142135623731,1,1,0 +"ocaml-re",-1.0950401153,1.1685448483,-1.5345632117,"https://salsa.debian.org/ocaml-team/ocaml-re","https://github.com/ocaml/ocaml-re",4365.6594907407,11,42,1,39,72,0,0,79,3,"3",1.79245283018868,1.91139240506329,0.676683594744332,1.38253115880377,1,1,0 +"sedlex",-2.795399504,0.6121377346,-3.6635666836,"https://salsa.debian.org/ocaml-team/ocaml-sedlex","https://github.com/ocaml-community/sedlex",5659.0575925926,13,22,0,27,81,0,0,81,4,"4",1.62857142857143,2,1.56635835672543,1.4142135623731,1,1,0 +"ocamlbuild",0.83301295,3.604633508,-0.2606702303,"https://salsa.debian.org/ocaml-team/ocamlbuild","https://github.com/ocaml/ocamlbuild.git",5691.866099537,18,45,0,44,121,0,0,131,4,"4",1.71428571428571,1.9236641221374,1.58892596415034,1.38696219203604,1,0,0 +"opencubicplayer",0.7353360216,1.8994727767,0.1001948826,"https://salsa.debian.org/multimedia-team/ocp","https://github.com/mywave82/opencubicplayer",4416.0663310185,9,13,0,12,37,0,0,38,3,"3",1.59090909090909,1.97368421052632,0.711356363756565,1.40487871737254,1,1,0 +"open-ath9k-htc-firmware",0.7603141973,2.9426626321,-0.0525201094,"https://salsa.debian.org/debian/open-ath9k-htc-firmware","https://github.com/qca/open-ath9k-htc-firmware.git",3892.0404398148,5,21,0,17,37,0,4,51,3,"3",1.80769230769231,1.72549019607843,0.350900747375917,1.31357915485837,1.07843137254902,0,0 +"openbox-debian",0.3587708308,0.5696355779,0.2001738591,"https://github.com/mati75/openbox-debian","https://github.com/mati75/openbox-debian",3123.4283217593,2,10,0,8,12,0,0,12,2,"2",1.83333333333333,2,-0.177795562142185,1.4142135623731,1,0,0 +"openbox-menu",0.6431292738,3.0088710056,-0.1389880185,"https://github.com/mati75/openbox-menu.git","https://github.com/mati75/openbox-menu.git",2669.041875,1,4,0,4,3,0,0,4,1,"1",1.8,1.75,-0.490349100986259,1.3228756555323,1,1,0 +"OpenCC",0.0219092289,0.4824222963,-0.1611861662,"https://salsa.debian.org/debian/opencc","https://github.com/BYVoid/OpenCC",3838.8327430556,56,72,0,83,474,0,3,480,3,"3",1.5625,1.9875,0.314301385677438,1.40978721798717,1.00625,1,0 +"opendht",-1.502253613,-0.1124423197,-1.9255361455,"https://salsa.debian.org/debian/opendht","https://github.com/savoirfairelinux/opendht.git",3308.8721527778,32,40,0,40,23,0,13,63,2,"2",1.55555555555556,1.36507936507937,-0.050236463372811,1.16836610917955,1.20634920634921,1,0 +"orocos_kinematics_dynamics",-0.4945558152,0.6669109207,-0.7546541561,"https://salsa.debian.org/science-team/orocos-kdl","https://github.com/orocos/orocos_kinematics_dynamics.git",5760.2385532407,20,61,0,49,251,0,0,254,4,"4",1.75308641975309,1.98818897637795,1.63595653145039,1.41003155155406,1,0,0 +"osdlyrics",-1.0107652487,2.5410275398,-1.9364271071,"https://salsa.debian.org/debian/osdlyrics","https://github.com/osdlyrics/osdlyrics.git",5185.1183796296,14,35,0,23,0,0,1,24,4,"4",1.71428571428571,1,1.2403552832072,1,1.04166666666667,1,0 +"osm-gps-map",0.4852394822,1.6315652979,0.0288716929,"https://salsa.debian.org/debian-gis-team/osm-gps-map","https://github.com/nzjrs/osm-gps-map",5396.5783564815,12,33,1,30,59,0,0,67,4,"4",1.73333333333333,1.88059701492537,1.38580980668677,1.37134861174151,1,0,0 +"ossim",0.2194206159,1.4101222421,-0.3093741078,"https://salsa.debian.org/debian-gis-team/ossim","https://github.com/ossimlabs/ossim.git",2917.9942824074,12,49,0,31,11,0,1,36,2,"2",1.80327868852459,1.30555555555556,-0.31910509383357,1.14260910006684,1.02777777777778,1,0 +"osslsigncode",0.169238484,2.9087642476,-0.725862886,"https://salsa.debian.org/debian/osslsigncode","https://github.com/mtrojnar/osslsigncode.git",3941.3454282407,25,12,0,28,157,0,0,162,3,"3",1.32432432432432,1.96913580246914,0.384815598325123,1.40325899336834,1,1,0 +"ostinato",-0.1569756889,1.8345639417,-0.7645775616,"https://salsa.debian.org/debian/ostinato","https://github.com/pstavirs/ostinato",3046.7549884259,4,10,3,11,90,0,2,95,2,"2",1.71428571428571,1.94736842105263,-0.230535959306848,1.39548142984872,1.02105263157895,0,0 +"othman",-1.2792306,0.9010183816,-1.7193110897,"https://salsa.debian.org/islamic-team/othman","https://github.com/ojuba-org/othman.git",4827.9828240741,2,13,0,8,20,0,0,21,3,"3",1.86666666666667,1.95238095238095,0.994696587768501,1.39727626201154,1,1,0 +"ounit",-0.3627412562,0.4497117871,-0.6191203191,"https://salsa.debian.org/ocaml-team/ounit","https://github.com/gildor478/ounit.git",1284.2142476852,12,7,0,14,26,0,0,26,1,"1",1.36842105263158,2,-1.44291443098952,1.4142135623731,1,1,0 +"outguess",0.1497827549,1.0974956579,-0.226083673,"https://salsa.debian.org/pkg-security-team/outguess","https://github.com/resurrecting-open-source-projects/outguess",1029.0813888889,1,3,0,2,9,0,0,9,1,"1",1.75,2,-1.61840971360835,1.4142135623731,1,1,0 +"overpass-api-python-wrapper",-0.0322169908,2.6635478479,-0.7275603387,"https://salsa.debian.org/python-team/packages/overpass","https://github.com/mvexel/overpass-api-python-wrapper.git",2968.0383449074,4,26,0,24,100,0,0,102,2,"2",1.86666666666667,1.98039215686275,-0.284681864566798,1.40726406792142,1,1,0 +"papi",0.1648741367,1.7494996599,-0.3472045276,"https://salsa.debian.org/hpc-team/papi","https://github.com/icl-utk-edu/papi",5785.0656134259,65,102,1,48,33,0,13,73,4,"4",1.61077844311377,1.45205479452055,1.65303403359713,1.20501236280818,1.17808219178082,0,0 +"par2cmdline",0.20056085,0.9463023937,-0.114418384,"https://salsa.debian.org/jcfp/par2cmdline","https://github.com/Parchive/par2cmdline.git",4198.3890972222,9,27,0,27,115,0,0,117,3,"3",1.75,1.98290598290598,0.561625247799968,1.40815694540984,1,1,0 +"parsedatetime",1.1943669328,3.3711848516,0.3370468439,"https://salsa.debian.org/python-team/packages/parsedatetime","https://github.com/bear/parsedatetime",3739.2471990741,8,57,2,39,150,0,0,150,2,"2",1.87692307692308,2,0.245800631724233,1.4142135623731,1,1,0 +"patsy",0.2674917865,1.4192573153,-0.1261483397,"https://salsa.debian.org/med-team/patsy","https://github.com/pydata/patsy",4676.8131944445,3,15,0,17,197,0,0,199,3,"3",1.83333333333333,1.98994974874372,0.890713286674338,1.41065578676859,1,1,0 +"pavucontrol-qt",1.2464488625,4.8736917607,0.1529128395,"https://salsa.debian.org/lxqt-team/pavucontrol-qt","https://github.com/lxqt/pavucontrol-qt.git",5699.7374189815,142,57,0,110,74,0,0,152,4,"4",1.28643216080402,1.48684210526316,1.59434031742892,1.2193613513898,1,0,0 +"pbcopper",-1.3874159842,-0.0972708879,-1.836455251,"https://salsa.debian.org/med-team/pbcopper","https://github.com/PacificBiosciences/pbcopper.git",2608.9496875,0,25,0,9,5,0,0,11,1,"1",2,1.45454545454545,-0.531684017540132,1.20604537831105,1,1,0 +"pcapfix",0.0933295762,2.1324165499,-0.3712900504,"https://salsa.debian.org/debian/pcapfix","https://github.com/Rup0rt/pcapfix",3586.925,0,13,0,6,14,0,0,14,2,"2",2,2,0.141024526044432,1.4142135623731,1,0,0 +"pcapy",0.0349538125,1.2547992825,-0.3075562935,"https://salsa.debian.org/python-team/packages/pcapy","https://github.com/CoreSecurity/pcapy.git",1937.2327893519,7,20,0,17,91,0,6,99,1,"1",1.74074074074074,1.91919191919192,-0.993730135145324,1.38534902432272,1.06060606060606,1,0 +"pcl",-0.4344154152,-0.1858665736,-0.5376364213,"https://salsa.debian.org/science-team/pcl","https://github.com/PointCloudLibrary/pcl",4663.6967824074,183,548,3,326,69,0,19,379,3,"3",1.74965800273598,1.1820580474934,0.881691052344131,1.08722492957686,1.05013192612137,0,0 +"pcmanfm",0.9104711528,1.3106826431,0.6098723045,"https://salsa.debian.org/lxde-team/pcmanfm","https://github.com/lxde/pcmanfm",5014.9549074074,162,27,0,87,11,0,0,91,4,"4",1.14285714285714,1.12087912087912,1.12330690774538,1.05871578852831,1,0,0 +"flext",-0.0850254405,1.799559297,-0.6918728933,"https://salsa.debian.org/multimedia-team/pd/pd-flext","https://github.com/grrrr/flext.git",5601.7882986111,3,10,0,6,23,0,0,23,4,"4",1.76923076923077,2,1.52696519121911,1.4142135623731,1,0,0 +"ggee",0.2137381335,2.1051137101,-0.4192763849,"https://salsa.debian.org/multimedia-team/pd/pd-ggee","https://github.com/pd-externals/ggee",5602.6691782407,2,15,0,6,8,0,0,10,4,"4",1.88235294117647,1.8,1.52757111168063,1.34164078649987,1,0,0 +"pd-iemmatrix",-0.3267928639,1.4162291626,-0.7027745657,"https://salsa.debian.org/multimedia-team/pd/pd-iemmatrix","https://github.com/iem-projects/pd-iemmatrix",5648.0384606482,0,11,0,2,0,0,0,2,4,"4",2,1,1.55877875414535,1,1,0,0 +"pdfminer.six",0.0208023168,1.0139403963,-0.2584702373,"https://salsa.debian.org/python-team/packages/pdfminer","https://github.com/pdfminer/pdfminer.six.git",5691.1447916667,73,66,0,116,635,0,0,663,4,"4",1.47482014388489,1.9577677224736,1.58842980646548,1.3992025308988,1,1,1 +"peek",0.2213731786,2.283866536,-0.2790469573,"https://salsa.debian.org/debian/peek","https://github.com/phw/peek.git",2556.2171064815,148,23,0,127,504,0,0,601,1,"1",1.13450292397661,1.83860232945092,-0.567956566880594,1.35595071055364,1,1,0 +"perftest",-0.25506659,1.1624795547,-0.6480880894,"https://salsa.debian.org/hpc-team/perftest","https://github.com/linux-rdma/perftest.git",5766.2372222222,45,67,0,63,139,0,1,158,4,"4",1.59821428571429,1.87974683544304,1.64008276635879,1.37103859735714,1.00632911392405,0,0 +"perl-cross-debian",0.5442661596,4.5107736512,-0.7462109296,"https://github.com/codehelp/perl-cross-debian","https://github.com/codehelp/perl-cross-debian",413.1343634259,0,1,2,1,2,0,1,3,1,"1",2,1.66666666666667,-2.04209405525625,1.29099444873581,1.33333333333333,1,0 +"project--perl-depends",-0.098094395,2.6971113742,-0.7916189031,"https://salsa.debian.org/perl-team/modules/packages/perl-depends","https://github.com/jaalto/project--perl-depends.git",2417.02125,0,1,0,1,0,0,0,1,1,"1",2,1,-0.66370360741407,1,1,0,0 +"perl6-readline",0.2335812759,2.6358883052,-0.5015207605,"https://salsa.debian.org/perl6-team/modules/perl6-readline","https://github.com/drforr/perl6-readline.git",1710.4289351852,3,11,0,10,39,0,0,39,1,"1",1.78571428571429,2,-1.14973907367959,1.4142135623731,1,1,0 +"zef",-0.1589879333,1.6245616073,-0.6015634669,"https://salsa.debian.org/perl6-team/modules/perl6-zef","https://github.com/ugexe/zef.git",3805.8422569445,19,20,0,23,111,0,0,113,3,"3",1.51282051282051,1.98230088495575,0.29160860235225,1.40794207443195,1,1,0 +"persp-projectile",-0.639585185,3.286323439,-1.7735281377,"https://salsa.debian.org/emacsen-team/persp-projectile","https://github.com/bbatsov/persp-projectile.git",2006.7800810185,9,2,0,10,40,0,0,40,1,"1",1.18181818181818,2,-0.945891445671974,1.4142135623731,1,1,0 +"pev",0.3261969594,2.6071816741,-0.2973930728,"https://salsa.debian.org/debian/pev","https://github.com/merces/pev",0.0019791667,1,1,0,1,0,0,0,1,1,"1",1.5,1,-2.32627064025836,1,1,0,0 +"pexpect",0.8141215364,1.9888952072,0.2667748433,"https://salsa.debian.org/python-team/packages/pexpect","https://github.com/pexpect/pexpect",5767.4715740741,21,92,0,85,558,0,0,562,4,"4",1.8141592920354,1.99288256227758,1.64093182566116,1.4116949253566,1,0,0 +"pg_checksums",-1.8213442024,-0.1372969868,-2.2303187848,"https://salsa.debian.org/postgresql/pg-checksums","https://github.com/credativ/pg_checksums.git",1977.03125,1,6,0,4,9,0,0,9,1,"1",1.85714285714286,2,-0.966354429279036,1.4142135623731,1,1,0 +"pg_fact_loader",-1.8451499975,1.7612439253,-2.8557684329,"https://salsa.debian.org/postgresql/pg-fact-loader","https://github.com/enova/pg_fact_loader.git",1795.1245717593,2,6,0,5,3,0,0,5,1,"1",1.75,1.6,-1.09148046776235,1.26491106406735,1,1,0 +"pg8000",-0.425873307,2.4793925595,-1.2002236195,"https://salsa.debian.org/python-team/packages/pg8000","https://github.com/mfenniak/pg8000",3962.2166666667,11,25,0,20,142,0,0,145,3,"3",1.69444444444444,1.97931034482759,0.39917205520589,1.40687964830954,1,0,0 +"pgbadger",-0.3152167506,1.8941783522,-0.7500435836,"https://salsa.debian.org/postgresql/pgbadger","https://github.com/darold/pgbadger.git",4259.9847222222,12,88,0,68,205,0,7,250,3,"3",1.88,1.82,0.603994316482294,1.3490737563232,1.028,1,1 +"pgsql-ogr-fdw",-1.597217053,1.098990575,-2.2031431994,"https://salsa.debian.org/debian-gis-team/pgsql-ogr-fdw","https://github.com/pramsey/pgsql-ogr-fdw.git",3285.0248958333,8,10,0,9,59,0,0,59,2,"2",1.55555555555556,2,-0.0666399996201755,1.4142135623731,1,1,0 +"semver",0.409271213,2.8658685018,-0.146438012,"https://salsa.debian.org/php-team/pear/php-composer-semver","https://github.com/composer/semver",2969.0927777778,37,21,0,44,78,0,1,97,2,"2",1.36206896551724,1.80412371134021,-0.283956564048996,1.34317672379334,1.01030927835052,1,1 +"Console_Table",-0.0495487945,1.7830511717,-0.4127695523,"https://salsa.debian.org/php-team/pear/php-console-table","https://github.com/pear/Console_Table.git",2649.3105555556,1,12,0,9,14,0,0,16,1,"1",1.92307692307692,1.875,-0.503921455008686,1.36930639376292,1,0,0 +"constant_time_encoding",-2.0834505626,2.1057169386,-3.3638483931,"https://salsa.debian.org/php-team/pear/php-constant-time","https://github.com/paragonie/constant_time_encoding",2771.7821296296,7,11,0,13,33,0,0,33,2,"2",1.61111111111111,2,-0.419678352782289,1.4142135623731,1,1,0 +"Crypt_GPG",0.9210658037,4.3264478549,-0.3696792994,"https://salsa.debian.org/php-team/pear/php-crypt-gpg","https://github.com/pear/Crypt_GPG.git",5743.4965972222,6,19,0,16,21,0,0,22,4,"4",1.76,1.95454545454545,1.62444043620135,1.39805059083906,1,1,0 +"DirectoryScanner",-0.4493402088,1.855270065,-0.9050981717,"https://salsa.debian.org/php-team/pear/php-directory-scanner","https://github.com/theseer/DirectoryScanner.git",4264.1542361111,0,7,0,2,12,0,0,12,3,"3",2,2,0.60686235167685,1.4142135623731,1,0,0 +"link-util",-0.4425381847,2.4746022946,-1.2653714987,"https://salsa.debian.org/php-team/pear/php-fig-link-util","https://github.com/php-fig/link-util",1680.1398148148,5,2,0,5,11,0,0,12,1,"1",1.28571428571429,1.91666666666667,-1.17057369986125,1.38443731048635,1,1,0 +"php-file-iterator",0.3114533151,2.1129587477,-0.2420172005,"https://salsa.debian.org/php-team/pear/php-file-iterator","https://github.com/sebastianbergmann/php-file-iterator",5147.3262731482,9,12,0,16,79,0,0,80,4,"4",1.57142857142857,1.9875,1.21435966492814,1.40978721798717,1,1,0 +"horde",-0.4754819462,0.1936727976,-0.7289488029,"https://salsa.debian.org/horde-team/php-horde","https://github.com/horde/horde.git",3269.665474537,81,80,0,67,71,0,0,99,2,"2",1.49689440993789,1.71717171717172,-0.0772051067332813,1.31040898851149,1,0,0 +"ActiveSync",-0.0745412838,1.9029925216,-0.5969694129,"https://salsa.debian.org/horde-team/php-horde-activesync","https://github.com/horde/ActiveSync.git",4982.0443055556,9,18,0,13,5,0,0,14,4,"4",1.66666666666667,1.35714285714286,1.10066907347979,1.16496474502144,1,0,0 +"html5-php",-0.3208200552,2.1227649729,-0.8298475571,"https://salsa.debian.org/php-team/pear/php-masterminds-html5","https://github.com/Masterminds/html5-php",3846.3884953704,7,39,1,37,85,0,6,98,3,"3",1.84782608695652,1.86734693877551,0.319498673451892,1.36650903355064,1.06122448979592,1,0 +"vfsStream",-3.8146826401,-1.3125722962,-4.3356315795,"https://salsa.debian.org/php-team/pear/php-mikey179-vfsstream","https://github.com/bovigo/vfsStream",5683.6370138889,11,48,1,35,196,0,26,222,4,"4",1.8135593220339,1.88288288288288,1.58326551837977,1.37218179658633,1.11711711711712,1,0 +"monolog",0.5054135947,3.1708681094,-0.3793108578,"https://salsa.debian.org/php-team/pear/php-monolog","https://github.com/Seldaek/monolog",4676.6184375,183,372,3,397,405,0,63,719,3,"3",1.67027027027027,1.56328233657858,0.890579321472136,1.25031289547,1.08762169680111,1,0 +"TypeResolver",0.0218360214,2.3125319388,-0.4129888352,"https://salsa.debian.org/php-team/pear/php-phpdocumentor-type-resolver","https://github.com/phpDocumentor/TypeResolver",3092.0947569445,18,31,1,40,91,0,0,91,2,"2",1.63265306122449,2,-0.199348618218819,1.4142135623731,1,1,0 +"phpseclib",0.1530214382,1.601109808,-0.1147352727,"https://salsa.debian.org/php-team/pear/phpseclib","https://github.com/phpseclib/phpseclib.git",5749.2331828704,80,98,0,135,155,0,5,268,4,"4",1.55056179775281,1.57835820895522,1.62838639488479,1.25632726984461,1.01865671641791,1,0 +"sql-formatter",-0.407920411,2.2773849827,-1.1530054701,"https://salsa.debian.org/php-team/pear/php-sql-formatter","https://github.com/doctrine/sql-formatter.git",4125.6360300926,10,31,0,25,28,0,0,42,3,"3",1.75609756097561,1.66666666666667,0.511581438713465,1.29099444873581,1,1,1 +"contracts",0.6071508908,3.5307618183,-0.1882490235,"https://salsa.debian.org/php-team/pear/php-symfony-contracts","https://github.com/symfony/contracts",1906.8477083333,28,26,0,51,11,0,0,57,1,"1",1.48148148148148,1.19298245614035,-1.01463076866589,1.0922373625455,1,1,0 +"polyfill",0.5936130532,2.9045150589,-0.1004774059,"https://salsa.debian.org/php-team/pear/php-symfony-polyfill","https://github.com/symfony/polyfill",2902.2220949074,100,47,0,117,227,0,0,263,2,"2",1.31972789115646,1.86311787072243,-0.329954125651301,1.36496075794231,1,1,0 +"text_password",0.8003864076,3.7354461105,-0.2651582454,"https://salsa.debian.org/php-team/pear/php-text-password","https://github.com/pear/text_password.git",3427.7869097222,0,13,0,7,6,0,0,8,2,"2",2,1.75,0.0315600522777617,1.3228756555323,1,1,0 +"php-text-template",0.2735156083,2.2577473237,-0.2649626383,"https://salsa.debian.org/php-team/pear/php-text-template","https://github.com/sebastianbergmann/php-text-template",5133.0452083333,0,8,0,5,13,0,0,13,4,"4",2,2,1.20453631438986,1.4142135623731,1,1,0 +"CssToInlineStyles",-4.9581043824,-2.5632479534,-5.4701338922,"https://salsa.debian.org/php-team/pear/php-tijsverkoyen-css-to-inline-styles","https://github.com/tijsverkoyen/CssToInlineStyles",4791.6600810185,7,34,0,31,149,0,0,158,3,"3",1.82926829268293,1.94303797468354,0.969711683479387,1.39392897045852,1,1,0 +"php-timer",0.0545002782,1.7354029969,-0.3034123852,"https://salsa.debian.org/php-team/pear/php-timer","https://github.com/sebastianbergmann/php-timer",4962.9242824074,4,10,0,11,38,0,0,38,3,"3",1.71428571428571,2,1.08751720475577,1.4142135623731,1,1,0 +"php-token-stream",-0.077539845,1.0314574326,-0.3184738926,"https://salsa.debian.org/php-team/pear/php-token-stream","https://github.com/sebastianbergmann/php-token-stream",4281.2169675926,15,15,0,18,77,0,0,77,3,"3",1.5,2,0.618599095025875,1.4142135623731,1,1,0 +"phpdox",-1.0964679734,0.6066407752,-1.5664870339,"https://salsa.debian.org/php-team/pear/phpdox","https://github.com/theseer/phpdox",4604.8372800926,11,44,0,36,366,0,0,368,3,"3",1.8,1.9945652173913,0.841204048661917,1.41229076942084,1,1,0 +"phpLDAPadmin",0.9538106411,1.6007846261,0.5030751444,"https://salsa.debian.org/php-team/pear/phpldapadmin","https://github.com/leenooks/phpLDAPadmin",5264.4283796296,42,25,0,26,189,0,1,192,4,"4",1.37313432835821,1.984375,1.29490933371315,1.40867845869808,1.00520833333333,0,0 +"phploc",-0.6743294156,1.1227196643,-1.1328550897,"https://salsa.debian.org/php-team/pear/phploc","https://github.com/sebastianbergmann/phploc",5362.0425347222,18,31,0,38,226,0,0,226,4,"4",1.63265306122449,2,1.36205405123952,1.4142135623731,1,1,0 +"phpseclib",-0.073403609,1.2483282321,-0.3161589858,"https://salsa.debian.org/php-team/pear/phpseclib","https://github.com/phpseclib/phpseclib.git",5749.2331828704,80,98,0,135,155,0,5,268,4,"4",1.55056179775281,1.57835820895522,1.62838639488479,1.25632726984461,1.01865671641791,1,0 +"comparator",0.1016908786,2.3398889578,-0.3301518045,"https://salsa.debian.org/php-team/pear/phpunit-comparator","https://github.com/sebastianbergmann/comparator",3686.3957291667,20,9,0,25,105,0,0,105,2,"2",1.31034482758621,2,0.209446303661672,1.4142135623731,1,1,0 +"pidcat",-0.2348175331,2.8745190447,-1.069688066,"https://salsa.debian.org/python-team/packages/pidcat","https://github.com/JakeWharton/pidcat.git",3155.524837963,4,40,0,30,259,0,0,261,2,"2",1.90909090909091,1.99233716475096,-0.155717703536189,1.41150174096632,1,1,0 +"Piexif",-0.8041956898,1.6330932338,-1.3844176603,"https://salsa.debian.org/python-team/packages/piexif","https://github.com/hMatoba/Piexif",3307.7984837963,5,12,0,10,155,0,0,155,2,"2",1.70588235294118,2,-0.0509749956114116,1.4142135623731,1,0,0 +"pipewalker",0.5020627732,3.1638761301,-0.3613058019,"https://salsa.debian.org/debian/pipewalker","https://github.com/artemsen/pipewalker",2088.9552662037,1,4,0,3,6,0,0,6,1,"1",1.8,2,-0.889366553439863,1.4142135623731,1,1,0 +"pipexec",-0.2552786974,1.5523174274,-0.6883958099,"https://salsa.debian.org/alteholz/pipexec","https://github.com/flonatel/pipexec.git",3308.5569560185,0,11,0,6,12,0,0,13,2,"2",2,1.92307692307692,-0.0504532741145353,1.38675049056307,1,1,0 +"pk4",-1.8075865154,0.2000705346,-2.2307798324,"https://github.com/Debian/pk4","https://github.com/Debian/pk4",1044.0391203704,0,1,0,1,4,0,0,4,1,"1",2,2,-1.60812091221261,1.4142135623731,1,1,0 +"pkcs11-helper",1.2104032601,4.0753663669,0.2461129198,"https://salsa.debian.org/opensc-team/pkcs11-helper","https://github.com/OpenSC/pkcs11-helper",5754.4088194445,16,2,0,13,58,0,3,61,4,"4",1.11111111111111,1.95081967213115,1.63194650002996,1.39671746324414,1.04918032786885,0,0 +"pkgconf",-0.0511523264,0.6206735889,-0.2703346973,"https://salsa.debian.org/debian/pkgconf","https://github.com/pkgconf/pkgconf",4516.657650463,52,29,1,67,201,0,9,219,3,"3",1.35802469135802,1.91780821917808,0.780548948820678,1.38484952943563,1.04109589041096,0,0 +"pktstat",2.3338787395,6.0502882403,0.926044188,"https://salsa.debian.org/debian/pktstat","https://github.com/dleonard0/pktstat",2938.7848958333,0,4,0,2,5,0,0,5,2,"2",2,2,-0.304804095537187,1.4142135623731,1,0,0 +"planetblupi",-0.2798326789,2.3368636861,-0.892136731,"https://salsa.debian.org/games-team/planetblupi","https://github.com/blupi-games/planetblupi",2504.3208449074,5,7,1,9,18,0,0,20,1,"1",1.58333333333333,1.9,-0.603653846857686,1.37840487520902,1,0,0 +"gmailfeed",-0.9078350467,1.5377434382,-1.4604242885,"https://salsa.debian.org/qt-kde-team/extras/plasma-gmailfeed","https://github.com/anthon38/gmailfeed.git",2727.0607638889,3,4,0,4,17,0,0,17,1,"1",1.57142857142857,2,-0.450440320318703,1.4142135623731,1,1,0 +"plastex",0.2432695472,2.6132312475,-0.7011641781,"https://salsa.debian.org/python-team/packages/plastex","https://github.com/plastex/plastex",5539.2969907407,17,19,1,19,79,0,1,80,4,"4",1.52777777777778,1.9875,1.48398001954159,1.40978721798717,1.0125,1,1 +"pngquant",0.5997315487,2.7135905645,-0.2341425934,"https://salsa.debian.org/debian-phototools-team/pngquant","https://github.com/kornelski/pngquant.git",4325.0383333333,23,38,0,41,383,0,0,386,3,"3",1.62295081967213,1.99222797927461,0.648741989993188,1.41146306337595,1,1,0 +"pngquant",0.7530300912,2.4617924213,0.0694002171,"https://salsa.debian.org/debian-phototools-team/pngquant","https://github.com/kornelski/pngquant.git",4325.0383333333,23,38,0,41,383,0,0,386,3,"3",1.62295081967213,1.99222797927461,0.648741989993188,1.41146306337595,1,1,0 +"pocketsphinx",-0.1321092966,0.4767106106,-0.3322064688,"https://salsa.debian.org/a11y-team/pocketsphinx","https://github.com/cmusphinx/pocketsphinx",5652.4787847222,5,30,2,19,191,0,5,206,4,"4",1.85714285714286,1.92718446601942,1.56183306840327,1.38823069625312,1.02427184466019,1,0 +"pocl",0.0943083762,0.5327681562,-0.1315933389,"https://salsa.debian.org/opencl-team/pocl","https://github.com/pocl/pocl",4689.6507291667,26,119,2,96,172,0,16,235,3,"3",1.82068965517241,1.73191489361702,0.899543692898102,1.31602237580408,1.06808510638298,1,0 +"popt",0.8457741179,1.4698340745,0.461614112,"https://salsa.debian.org/debian/popt","https://github.com/rpm-software-management/popt.git",5739.6746643519,38,10,0,43,33,0,0,60,4,"4",1.20833333333333,1.55,1.62181148753363,1.24498995979887,1,0,0 +"portalocker",-0.6761775694,1.2289979494,-1.0819015205,"https://salsa.debian.org/python-team/packages/portalocker","https://github.com/WoLpH/portalocker",4590.8550231482,5,21,0,17,76,0,0,76,3,"3",1.80769230769231,2,0.831586235630372,1.4142135623731,1,0,0 +"postfixadmin",1.3718594968,2.8225561724,0.562614351,"https://salsa.debian.org/debian/postfixadmin","https://github.com/postfixadmin/postfixadmin",5760.0218055556,53,77,1,94,124,0,0,183,4,"4",1.59230769230769,1.6775956284153,1.63580743973232,1.29522030111302,1,0,0 +"postgis-java",-0.2249511782,0.6204972087,-0.4368391732,"https://salsa.debian.org/debian-gis-team/postgis-java","https://github.com/postgis/postgis-java.git",5635.3241319445,8,12,0,15,32,0,1,39,4,"4",1.6,1.82051282051282,1.55003309621759,1.34926380686388,1.02564102564103,0,0 +"autodoc",0.4941840875,2.0445546371,-0.1932500455,"https://salsa.debian.org/debian/postgresql-autodoc","https://github.com/cbbrowne/autodoc.git",4575.8853587963,5,13,0,11,24,0,0,24,3,"3",1.72222222222222,2,0.821289226109371,1.4142135623731,1,0,0 +"pg_filedump",-0.6115611941,1.2319618721,-1.0974123114,"https://salsa.debian.org/postgresql/postgresql-filedump","https://github.com/df7cb/pg_filedump.git",4622.5029861111,3,6,0,6,19,0,0,21,3,"3",1.66666666666667,1.9047619047619,0.8533555531173,1.38013111868471,1,1,0 +"postgresql-hll",-1.5534816636,0.6872065961,-2.2881681018,"https://salsa.debian.org/postgresql/postgresql-hll","https://github.com/citusdata/postgresql-hll.git",3859.4959259259,23,21,0,27,124,0,0,126,3,"3",1.47727272727273,1.98412698412698,0.328514729794446,1.40859042454753,1,1,0 +"mysql_fdw",-1.2606174982,0.3226021522,-1.7176084858,"https://salsa.debian.org/postgresql/postgresql-mysql-fdw","https://github.com/EnterpriseDB/mysql_fdw.git",4475.7229861111,5,27,0,22,248,0,0,249,3,"3",1.84375,1.99598393574297,0.752391695681132,1.41279295572386,1,1,1 +"postgresql-numeral",-1.5134522364,1.6243431313,-2.293706422,"https://github.com/df7cb/postgresql-numeral","https://github.com/df7cb/postgresql-numeral",2361.1246527778,0,4,0,2,3,0,0,3,1,"1",2,2,-0.702152551909976,1.4142135623731,1,1,0 +"plsh",-1.6026559782,-0.4185729412,-1.9028536338,"https://salsa.debian.org/postgresql/postgresql-plsh","https://github.com/petere/plsh.git",3969.9145023148,1,1,0,2,23,0,0,23,3,"3",1.5,2,0.404467076196092,1.4142135623731,1,1,0 +"postgrey",0.4162125811,0.8007795616,0.16790509,"https://salsa.debian.org/debian/postgrey","https://github.com/schweikert/postgrey.git",5469.9499074074,10,14,0,22,75,0,0,83,4,"4",1.58333333333333,1.90361445783133,1.43627904505407,1.37971535391592,1,1,0 +"postsrsd",0.10383995,2.0191274283,-0.4773257062,"https://salsa.debian.org/debian/postsrsd","https://github.com/roehling/postsrsd.git",4014.2085648148,10,17,0,4,30,0,0,33,3,"3",1.62962962962963,1.90909090909091,0.434935119604722,1.38169855941551,1,0,0 +"potool",-0.5814294404,0.0587787858,-0.834772415,"https://github.com/porridge/potool/tree/debian","https://github.com/porridge/potool",4430.2149884259,2,3,0,2,1,0,0,3,3,"3",1.6,1.33333333333333,0.721088636746031,1.15470053837925,1,0,0 +"povray",0.9584216742,1.6940449747,0.4892724706,"https://salsa.debian.org/debian/povray","https://github.com/POV-Ray/povray",2833.0740740741,8,15,7,14,45,0,2,50,2,"2",1.65217391304348,1.9,-0.377518173324052,1.37840487520902,1.04,0,0 +"powa-archivist",-1.3322892717,0.6277535501,-1.7515157782,"https://github.com/powa-team/powa-archivist","https://github.com/powa-team/powa-archivist",3471.9301967593,10,15,2,15,40,0,0,42,2,"2",1.6,1.95238095238095,0.0619243835161976,1.39727626201154,1,1,0 +"powercap",-0.3284328359,2.6169095108,-1.1283456001,"https://github.com/connorimes/powercap/tree/debian","https://github.com/connorimes/powercap",2525.9958912037,0,4,0,2,2,0,0,3,1,"1",2,1.66666666666667,-0.588744483973219,1.29099444873581,1,1,0 +"pqiv",-0.1638813895,0.7585584788,-0.4540092183,"https://salsa.debian.org/pberndt-guest/pqiv","https://github.com/phillipberndt/pqiv",5604.8415509259,11,12,0,15,127,0,0,127,4,"4",1.52173913043478,2,1.52906539650204,1.4142135623731,1,0,0 +"prboom-plus",0.97864662,1.8842985584,0.4320575143,"https://salsa.debian.org/games-team/prboom-plus","https://github.com/coelckers/prboom-plus",5585.983912037,42,11,1,41,53,0,1,73,4,"4",1.20754716981132,1.72602739726027,1.51609401099746,1.31378361888869,1.01369863013699,0,0 +"primus",0.2729569091,1.2481073389,-0.1134531508,"https://salsa.debian.org/nvidia-team/primus","https://github.com/amonakov/primus",937.9013425926,3,6,0,6,216,0,0,216,1,"1",1.66666666666667,2,-1.68112867528762,1.4142135623731,1,0,0 +"bird_exporter",-3.477178786,-0.0329330544,-4.2892202007,"https://salsa.debian.org/go-team/packages/prometheus-bird-exporter","https://github.com/czerwonk/bird_exporter",2542.4624768519,10,16,6,19,56,0,0,57,1,"1",1.61538461538462,1.98245614035088,-0.577417804549283,1.40799720892865,1,1,0 +"haproxy_exporter",-3.8607213348,-2.0700503351,-4.3161894613,"https://salsa.debian.org/go-team/packages/prometheus-haproxy-exporter","https://github.com/prometheus/haproxy_exporter",3672.0941203704,21,40,0,41,166,0,0,171,2,"2",1.65573770491803,1.97076023391813,0.199608821773012,1.40383768075876,1,1,1 +"postfix_exporter",-2.309018579,-0.0678780093,-2.9354675488,"https://salsa.debian.org/go-team/packages/prometheus-postfix-exporter","https://github.com/kumina/postfix_exporter",2274.256712963,7,24,0,20,129,0,0,130,1,"1",1.7741935483871,1.99230769230769,-0.761905394880647,1.41149130082608,1,1,0 +"pushgateway",-0.8937395968,2.0265228669,-1.5977918562,"https://salsa.debian.org/go-team/packages/prometheus-pushgateway","https://github.com/prometheus/pushgateway",3606.187337963,18,76,1,58,280,0,0,292,2,"2",1.80851063829787,1.95890410958904,0.154274287210692,1.39960855584304,1,1,1 +"proot-debian",1.0920103364,3.4894212371,0.1526188422,"https://github.com/ivoire/proot-debian","https://github.com/ivoire/proot-debian",508.0834837963,0,2,0,1,3,0,0,3,1,"1",2,2,-1.97678250427678,1.4142135623731,1,0,0 +"prospector",-0.1396414973,2.1237521604,-0.9708127034,"https://salsa.debian.org/python-team/packages/prospector","https://github.com/PyCQA/prospector",3767.6942939815,36,66,2,76,313,0,0,327,2,"2",1.64705882352941,1.95718654434251,0.265368205199528,1.39899483356534,1,0,0 +"ps2eps",1.532120796,4.5656897613,0.4495361846,"https://salsa.debian.org/debian/ps2eps","https://github.com/roland-bless/ps2eps.git",0.1197453704,1,2,0,1,1,0,0,2,1,"1",1.66666666666667,1.5,-2.32618963378472,1.22474487139159,1,0,0 +"pudb",0.5652873271,3.503587652,-0.3825137639,"https://salsa.debian.org/debian/pudb","https://github.com/inducer/pudb.git",5292.8559490741,32,73,0,84,306,0,0,318,4,"4",1.6952380952381,1.9622641509434,1.31446347643457,1.40080839194495,1,0,0 +"puppetlabs-ntp",-1.6019329854,0.0840048992,-1.9766118562,"https://salsa.debian.org/puppet-team/puppet-module-puppetlabs-ntp","https://github.com/puppetlabs/puppetlabs-ntp.git",4661.5050231482,40,171,0,118,228,0,0,234,3,"3",1.81042654028436,1.97435897435897,0.88018343230475,1.40511884705849,1,1,1 +"py-lmdb",-0.075515578,2.3670377588,-0.9569815252,"https://salsa.debian.org/debian/py-lmdb","https://github.com/jnwatson/py-lmdb",3712.4741898148,18,23,0,26,205,0,0,207,2,"2",1.5609756097561,1.99033816425121,0.22738459214123,1.410793452016,1,1,0 +"fe",0.0569254607,2.238596245,-0.7405534191,"https://salsa.debian.org/python-team/packages/py-postgresql","https://github.com/python-postgres/fe",5231.8056712963,1,11,0,5,69,0,0,69,4,"4",1.91666666666667,2,1.27246952942547,1.4142135623731,1,0,0 +"py-radix",-0.2347152131,1.2849195969,-0.668352957,"https://salsa.debian.org/python-team/packages/py-radix","https://github.com/mjschultz/py-radix",1374.4915856482,3,11,0,9,39,0,0,40,1,"1",1.78571428571429,1.975,-1.38081640482919,1.40534693225552,1,0,0 +"py-ubjson",0.3258683606,2.3051690362,-0.1923435128,"https://salsa.debian.org/python-team/packages/py-ubjson","https://github.com/Iotic-Labs/py-ubjson",2987.1609027778,3,4,0,5,12,0,0,13,2,"2",1.57142857142857,1.92307692307692,-0.2715282523128,1.38675049056307,1,1,1 +"pycairo",1.8611353266,3.0551049835,1.1479506832,"https://salsa.debian.org/python-team/packages/pycairo","https://github.com/pygobject/pycairo",2389.8532175926,13,23,2,28,234,0,0,236,1,"1",1.63888888888889,1.99152542372881,-0.682391366991682,1.41121416649948,1,0,0 +"pychm",0.1959778752,1.6504366967,-0.1847897986,"https://salsa.debian.org/python-team/packages/pychm","https://github.com/dottedmag/pychm.git",3381.7747222222,2,4,0,3,19,0,0,19,2,"2",1.66666666666667,2,-8.98178617413476e-05,1.4142135623731,1,0,0 +"pychromecast",0.0550333172,1.8645058973,-0.3583381658,"https://salsa.debian.org/python-team/packages/pychromecast","https://github.com/home-assistant-libs/pychromecast.git",3717.1753935185,57,30,0,74,318,0,0,345,2,"2",1.3448275862069,1.92173913043478,0.230618354646467,1.38626805865056,1,0,0 +"pycoast",-0.9264089102,1.0445653141,-1.3282069805,"https://salsa.debian.org/debian-gis-team/pycoast","https://github.com/pytroll/pycoast",3185.132662037,7,21,0,12,29,0,0,30,2,"2",1.75,1.96666666666667,-0.135351712741786,1.40237893119751,1,0,0 +"pydenticon",-0.865220641,1.8522581651,-1.5367272325,"https://salsa.debian.org/python-team/packages/pydenticon","https://github.com/azaghal/pydenticon",1376.6938657407,2,1,0,2,13,0,0,13,1,"1",1.33333333333333,2,-1.37930154794614,1.4142135623731,1,0,0 +"pydicom",0.3543730908,1.939756419,-0.1871292016,"https://salsa.debian.org/med-team/pydicom","https://github.com/pydicom/pydicom.git",5576.1416435185,69,58,0,87,155,0,4,210,4,"4",1.45669291338583,1.73809523809524,1.50932392382244,1.31836839999116,1.01904761904762,0,1 +"pydocstyle",0.5531580789,3.8832816133,-0.434312514,"https://salsa.debian.org/python-team/packages/pydocstyle","https://github.com/PyCQA/pydocstyle.git",4295.4277893519,58,44,0,86,381,0,0,394,3,"3",1.43137254901961,1.96700507614213,0.628374128287605,1.40249958151228,1,0,0 +"PyHamcrest",0.4770044067,2.0276091701,-0.0667553805,"https://salsa.debian.org/python-team/packages/pyhamcrest","https://github.com/hamcrest/PyHamcrest",5756.5347222222,18,36,0,32,112,0,0,113,4,"4",1.66666666666667,1.99115044247788,1.63340882013468,1.4110813025754,1,0,0 +"pylama",-0.1685043243,2.3124561576,-0.8358206635,"https://salsa.debian.org/python-team/packages/pylama","https://github.com/klen/pylama",3643.0438888889,6,46,0,37,127,0,0,134,2,"2",1.88461538461538,1.94776119402985,0.179626375732776,1.39562215303063,1,0,0 +"pylast",0.1007769388,2.2899648047,-0.3798195506,"https://salsa.debian.org/python-team/packages/pylast","https://github.com/pylast/pylast",5565.5985532407,8,38,2,32,125,0,0,130,4,"4",1.82608695652174,1.96153846153846,1.50207177050629,1.40054934277178,1,1,0 +"pylibtiff",0.0190555879,2.1644424074,-0.7692360791,"https://salsa.debian.org/debian-gis-team/pylibtiff","https://github.com/pearu/pylibtiff.git",3040.1433796296,10,20,0,22,100,0,1,103,2,"2",1.66666666666667,1.97087378640777,-0.23508381002175,1.40387812377278,1.00970873786408,1,0 +"pymca",-0.4153476895,-0.1437047675,-0.5016872933,"https://salsa.debian.org/science-team/pymca","https://github.com/vasole/pymca",5785.8055439815,7,32,0,17,52,0,0,52,4,"4",1.82051282051282,2,1.65354300105269,1.4142135623731,1,0,0 +"pymediainfo",0.3813327313,2.7232285427,-0.3112268398,"https://salsa.debian.org/python-team/packages/pymediainfo","https://github.com/sbraz/pymediainfo",4970.7511111111,10,7,0,12,111,0,0,112,3,"3",1.41176470588235,1.99107142857143,1.09290095470412,1.41105330465274,1,0,0 +"pymodbus",0.0732799109,1.8646692265,-0.5844401794,"https://salsa.debian.org/python-team/packages/pymodbus","https://github.com/pymodbus-dev/pymodbus.git",5499.738599537,102,63,0,125,552,0,0,603,4,"4",1.38181818181818,1.91542288557214,1.45676944746164,1.38398803664343,1,0,0 +"pyopencl",0.1782677537,0.865226367,-0.1694455174,"https://salsa.debian.org/opencl-team/python-pyopencl","https://github.com/inducer/pyopencl",5374.16875,28,83,0,77,238,0,0,251,4,"4",1.74774774774775,1.94820717131474,1.37039517040118,1.39578192111617,1,0,0 +"pyorbital",-0.835136266,1.1503801119,-1.2127768903,"https://salsa.debian.org/debian-gis-team/pyorbital","https://github.com/pytroll/pyorbital.git",4467.5734606482,9,33,0,26,73,0,0,75,3,"3",1.78571428571429,1.97333333333333,0.746785976053058,1.4047538337137,1,1,0 +"pypuppetdb",-1.329401636,2.4185219671,-2.4698360721,"https://salsa.debian.org/python-team/packages/pypuppetdb","https://github.com/voxpupuli/pypuppetdb",3781.8189814815,18,46,2,46,103,0,0,106,3,"3",1.71875,1.97169811320755,0.2750839902866,1.40417168224101,1,1,1 +"pyqi",-0.6659052808,0.4267300657,-0.9064389106,"https://salsa.debian.org/med-team/pyqi","https://github.com/biocore/pyqi",1051.0106481482,0,13,1,7,17,0,0,17,1,"1",2,2,-1.60332548819932,1.4142135623731,1,1,0 +"pyquery",0.2533160207,2.1476722718,-0.276904445,"https://salsa.debian.org/python-team/packages/pyquery","https://github.com/gawel/pyquery.git",5354.1741550926,7,50,0,45,213,0,0,222,4,"4",1.87719298245614,1.95945945945946,1.35664172013735,1.39980693649498,1,0,0 +"pysodium",-0.9250342629,1.6337160906,-1.6304178321,"https://salsa.debian.org/python-team/packages/pysodium","https://github.com/stef/pysodium.git",3761.6783217593,9,38,0,33,63,0,0,66,2,"2",1.80851063829787,1.95454545454545,0.261230068111491,1.39805059083906,1,1,0 +"python-soundfile",-0.4259563033,1.9817809485,-0.87334628,"https://salsa.debian.org/multimedia-team/pysoundfile","https://github.com/bastibe/python-soundfile.git",3757.2281481482,8,31,0,27,287,0,0,287,2,"2",1.7948717948718,2,0.258168978766639,1.4142135623731,1,0,0 +"pysph",-0.1957650825,0.8352828367,-0.6085553873,"https://salsa.debian.org/science-team/pysph","https://github.com/pypr/pysph",3944.0042824074,12,53,0,27,60,0,0,66,3,"3",1.81538461538462,1.90909090909091,0.386644513524948,1.38169855941551,1,0,0 +"pysrs",-2.5865636963,-0.2466583264,-3.0140171336,"https://salsa.debian.org/python-team/packages/pysrs","https://github.com/sdgathman/pysrs.git",5232.0373842593,2,4,0,2,7,0,0,7,4,"4",1.66666666666667,2,1.2726289151358,1.4142135623731,1,1,0 +"pyssim",-1.4493782429,1.5830189811,-2.3198514231,"https://salsa.debian.org/python-team/packages/pyssim","https://github.com/jterrace/pyssim",4069.879375,2,12,0,7,3,0,0,8,3,"3",1.85714285714286,1.375,0.473228754588333,1.17260393995586,1,1,0 +"PyStaticConfiguration",-2.0472160299,0.7630493618,-2.7265555606,"https://salsa.debian.org/python-team/packages/pystaticconfiguration","https://github.com/dnephin/PyStaticConfiguration",3745.7102662037,3,26,2,20,44,0,0,45,2,"2",1.89655172413793,1.97777777777778,0.250246306804443,1.40633487398193,1,0,0 +"pysubnettree",-0.9461476097,1.2999152117,-1.5398813128,"https://salsa.debian.org/python-team/packages/pysubnettree","https://github.com/zeek/pysubnettree.git",4655.7478587963,1,18,0,11,28,0,0,30,3,"3",1.94736842105263,1.93333333333333,0.876223318386901,1.39044357430761,1,0,0 +"pytest-arraydiff",0.1898441175,2.3416228263,-0.2394386956,"https://salsa.debian.org/python-team/packages/pytest-arraydiff","https://github.com/astrofrog/pytest-arraydiff",2688.582349537,5,12,0,11,0,0,0,11,1,"1",1.70588235294118,1,-0.476908021238413,1,1,0,0 +"pytest-bdd",-3.4287681139,-0.5039458847,-4.2303785564,"https://salsa.debian.org/python-team/packages/pytest-bdd","https://github.com/pytest-dev/pytest-bdd.git",3909.5599768519,26,45,0,50,355,0,0,365,3,"3",1.63380281690141,1.97260273972603,0.362951708268146,1.40449376635357,1,0,1 +"pytest-expect",-1.4175585643,1.7604433826,-2.2515689023,"https://salsa.debian.org/python-team/packages/pytest-expect","https://github.com/gsnedders/pytest-expect",1755.9376273148,2,3,0,2,13,0,0,13,1,"1",1.6,2,-1.11843553706507,1.4142135623731,1,0,0 +"pytest-pylint",-0.8320096401,0.1532890227,-1.1006353608,"https://salsa.debian.org/python-team/packages/pytest-pylint","https://github.com/carsongee/pytest-pylint",3089.6046180556,5,20,0,19,97,0,0,97,2,"2",1.8,2,-0.201061481195895,1.4142135623731,1,0,0 +"pytest-remotedata",0.030168843,1.6486281266,-0.2466155852,"https://salsa.debian.org/python-team/packages/pytest-remotedata","https://github.com/astropy/pytest-remotedata",4372.8560069445,4,28,1,27,27,0,1,44,3,"3",1.875,1.61363636363636,0.68163377893862,1.27028987386201,1.02272727272727,0,0 +"pytest-sugar",-1.9343898664,0.0895529374,-2.5336128329,"https://salsa.debian.org/python-team/packages/pytest-sugar","https://github.com/Teemu/pytest-sugar.git",3774.5057060185,13,48,0,45,191,0,0,199,3,"3",1.78688524590164,1.95979899497487,0.270053492253913,1.39992821065042,1,1,0 +"py-amqp",0.4927928639,2.9780373711,-0.1037801308,"https://salsa.debian.org/python-team/packages/python-amqp","https://github.com/celery/py-amqp.git",5725.5644791667,68,43,0,82,220,0,0,249,4,"4",1.38738738738739,1.88353413654618,1.61210567798576,1.37241908196665,1,0,0 +"argh",0.2339030674,2.0159100899,-0.2686508718,"https://salsa.debian.org/python-team/packages/python-argh","https://github.com/neithere/argh.git",4744.0471875,5,24,0,22,102,0,0,107,3,"3",1.82758620689655,1.95327102803738,0.936960754242943,1.39759472953978,1,0,0 +"asyncssh",-1.1827053689,0.2562433063,-1.6493196582,"https://salsa.debian.org/python-team/packages/python-asyncssh","https://github.com/ronf/asyncssh",3723.8668634259,18,9,0,23,71,0,0,87,2,"2",1.33333333333333,1.81609195402299,0.23522113849828,1.34762455974318,1,0,0 +"python-atomicwrites",0.8071747449,3.936888395,-0.0360579534,"https://salsa.debian.org/python-team/packages/python-atomicwrites","https://github.com/untitaker/python-atomicwrites",2718.0744907407,9,8,0,15,53,0,0,53,1,"1",1.47058823529412,2,-0.456621603879252,1.4142135623731,1,0,0 +"avro",-0.6764070684,0.594195245,-0.9704692662,"https://salsa.debian.org/python-team/packages/python-avro","https://github.com/apache/avro",5362.5630555556,342,76,0,310,0,0,0,310,4,"4",1.18181818181818,1,1.36241209587241,1,1,1,0 +"aws-xray-sdk-python",-0.6565672961,2.2186104229,-1.3887187484,"https://salsa.debian.org/science-team/python-aws-xray-sdk","https://github.com/aws/aws-xray-sdk-python",2264.9942939815,64,31,0,69,93,0,0,126,1,"1",1.32631578947368,1.73809523809524,-0.768276627675048,1.31836839999116,1,1,1 +"azure-python-devtools",-1.8877692262,1.0407212341,-2.6897741774,"https://salsa.debian.org/python-team/packages/python-azure-devtools","https://github.com/Azure/azure-python-devtools",1688.8337962963,6,14,0,12,28,0,0,31,1,"1",1.7,1.90322580645161,-1.16459347158185,1.37957450195762,1,0,0 +"b2-sdk-python",-2.7091203496,0.0195888217,-3.2985895116,"https://salsa.debian.org/python-team/packages/python-b2sdk","https://github.com/Backblaze/b2-sdk-python.git",2948.6294907407,24,86,0,77,61,0,0,112,2,"2",1.78181818181818,1.54464285714286,-0.298032408135991,1.24283661723609,1,1,1 +"babel",0.4571086267,1.1252224199,0.1143783436,"https://salsa.debian.org/python-team/packages/python-babel","https://github.com/python-babel/babel",5776.7216782407,75,93,2,137,127,0,0,236,4,"4",1.55357142857143,1.53813559322034,1.64729458760656,1.24021594620467,1,0,0 +"base58",-0.6380025418,1.8870432293,-1.1948721512,"https://salsa.debian.org/python-team/packages/python-base58","https://github.com/keis/base58",3504.7240046296,9,12,0,15,37,0,0,38,2,"2",1.57142857142857,1.97368421052632,0.0844818800593647,1.40487871737254,1,1,0 +"bayespy",-0.4133726859,2.2939543254,-1.2809021253,"https://salsa.debian.org/science-team/python-bayespy","https://github.com/bayespy/bayespy",4227.6050231482,4,9,0,7,68,0,0,68,3,"3",1.69230769230769,2,0.581721668157363,1.4142135623731,1,0,0 +"bcrypt",0.720872399,2.4323524124,0.0873154337,"https://salsa.debian.org/python-team/packages/python-bcrypt","https://github.com/pyca/bcrypt.git",3870.0652083333,26,10,0,30,196,0,0,198,3,"3",1.27777777777778,1.98989898989899,0.335784899587219,1.4106377954312,1,0,0 +"python-blosc",0.4104792893,2.7209909901,-0.2401314247,"https://salsa.debian.org/python-team/packages/python-blosc","https://github.com/Blosc/python-blosc.git",4736.2912268519,17,36,0,37,120,0,0,121,3,"3",1.67924528301887,1.99173553719008,0.931625751482653,1.41128860875091,1,0,0 +"boltons",-0.0997518599,2.672673187,-0.8614154477,"https://salsa.debian.org/python-team/packages/python-boltons","https://github.com/mahmoud/boltons",3938.2483333333,42,55,0,73,206,0,0,206,3,"3",1.56701030927835,2,0.382685235546154,1.4142135623731,1,1,0 +"bumps",-0.8935367246,0.0933032097,-1.1605313205,"https://salsa.debian.org/science-team/python-bumps","https://github.com/bumps/bumps",4409.9511574074,1,19,0,10,22,0,0,24,3,"3",1.95,1.91666666666667,0.707149990158878,1.38443731048635,1,0,0 +"cachetools",0.5221597712,3.3731185733,-0.2589146292,"https://salsa.debian.org/python-team/packages/python-cachetools","https://github.com/tkem/cachetools",3511.0841203704,2,11,0,11,206,0,0,206,2,"2",1.84615384615385,2,0.0888567391609565,1.4142135623731,1,0,0 +"certbot",-2.2720142983,0.1157477766,-2.775909363,"https://salsa.debian.org/letsencrypt-team/certbot/certbot-dns-dnsimple","https://github.com/certbot/certbot.git",4226.9669907407,268,343,0,391,635,0,143,1074,3,"3",1.56137479541735,1.59124767225326,0.58128279219994,1.26144665850493,1.13314711359404,0,0 +"certbot",-0.8998199839,1.9089794558,-1.5782805062,"https://salsa.debian.org/letsencrypt-team/certbot/certbot-dns-google","https://github.com/certbot/certbot.git",4226.9669907407,268,343,0,391,635,0,143,1074,3,"3",1.56137479541735,1.59124767225326,0.58128279219994,1.26144665850493,1.13314711359404,0,0 +"certbot",-0.2811377468,1.8247084979,-0.7514361439,"https://salsa.debian.org/letsencrypt-team/certbot/certbot-dns-rfc2136","https://github.com/certbot/certbot.git",4226.9669907407,268,343,0,391,635,0,143,1074,3,"3",1.56137479541735,1.59124767225326,0.58128279219994,1.26144665850493,1.13314711359404,0,0 +"certbot",-1.1000615706,1.1834717942,-1.6727445902,"https://salsa.debian.org/letsencrypt-team/certbot/certbot-dns-route53","https://github.com/certbot/certbot.git",4226.9669907407,268,343,0,391,635,0,143,1074,3,"3",1.56137479541735,1.59124767225326,0.58128279219994,1.26144665850493,1.13314711359404,0,0 +"cmarkgfm",-1.3150135933,1.231941831,-1.8951479522,"https://salsa.debian.org/python-team/packages/python-cmarkgfm","https://github.com/theacodes/cmarkgfm",1977.4600578704,18,8,0,20,50,0,0,50,1,"1",1.30769230769231,2,-0.966059470179059,1.4142135623731,1,0,0 +"colorama",0.7784754841,2.4846627407,0.147974244,"https://salsa.debian.org/python-team/packages/python-colorama","https://github.com/tartley/colorama",3514.6796527778,15,42,0,45,341,0,1,348,2,"2",1.73684210526316,1.97988505747126,0.0913299563662152,1.40708388430515,1.00287356321839,0,0 +"python-colorlog",0.0760601286,2.176247301,-0.417655582,"https://salsa.debian.org/python-team/packages/python-colorlog","https://github.com/borntyping/python-colorlog.git",4104.9554398148,10,24,0,30,43,0,0,56,3,"3",1.70588235294118,1.76785714285714,0.49735612076481,1.32960789064188,1,1,0 +"colormap",-0.8079814337,1.468837378,-1.3890414287,"https://salsa.debian.org/python-team/packages/python-colormap","https://github.com/cokelaer/colormap",3308.9144444445,1,7,0,6,15,0,0,15,2,"2",1.875,2,-0.0502073726941936,1.4142135623731,1,0,0 +"pythonfutures",0.253069403,1.4926901749,-0.0680161382,"https://salsa.debian.org/python-team/modules/python-concurrent.futures","https://github.com/agronholm/pythonfutures.git",4929.1742592593,10,12,0,14,86,0,0,86,3,"3",1.54545454545455,2,1.0643019674919,1.4142135623731,1,0,0 +"ConfigArgParse",0.6238780174,3.3511057459,-0.0441913435,"https://salsa.debian.org/python-team/packages/configargparse","https://github.com/bw2/ConfigArgParse",3315.6581828704,8,51,0,44,239,0,1,240,2,"2",1.86440677966102,1.99583333333333,-0.045568635502346,1.41273965518539,1.00416666666667,0,0 +"css-parser",0.7375204292,3.6525325545,-0.047073823,"https://salsa.debian.org/python-team/packages/python-css-parser","https://github.com/ebook-utils/css-parser",1765.7022685185,2,7,0,7,11,0,0,11,1,"1",1.77777777777778,2,-1.11171884649139,1.4142135623731,1,1,0 +"cssselect",0.7663890486,3.666235057,-0.0218050513,"https://salsa.debian.org/python-team/packages/python-cssselect","https://github.com/scrapy/cssselect",5713.5145601852,8,23,0,24,65,0,1,68,4,"4",1.74193548387097,1.95588235294118,1.60381703987317,1.39852863858456,1.01470588235294,0,0 +"pycups",0.7229281241,2.1065141416,0.1579248085,"https://salsa.debian.org/python-team/packages/python-cups","https://github.com/OpenPrinting/pycups.git",5524.6673842593,4,9,0,9,62,0,1,68,4,"4",1.69230769230769,1.91176470588235,1.47391692168673,1.38266579688743,1.01470588235294,1,0 +"curtsies",0.3166501906,2.6067653967,-0.304611589,"https://salsa.debian.org/sramacher/python-curtsies","https://github.com/bpython/curtsies",3799.8890277778,15,32,1,35,70,0,0,73,3,"3",1.68085106382979,1.95890410958904,0.287513623602615,1.39960855584304,1,0,0 +"cycler",0.6283830281,2.4968734847,0.0195972629,"https://salsa.debian.org/python-team/packages/python-cycler","https://github.com/matplotlib/cycler",2790.0141087963,6,19,2,21,28,0,0,35,2,"2",1.76,1.8,-0.407137332579497,1.34164078649987,1,0,0 +"cytoolz",-0.3584848,2.3538098789,-1.0758303941,"https://salsa.debian.org/python-team/packages/python-cytoolz","https://github.com/pytoolz/cytoolz",3395.421412037,2,21,0,16,68,0,0,71,2,"2",1.91304347826087,1.95774647887324,0.00929717249755207,1.3991949395539,1,0,0 +"python-darkslide",0.9320448351,4.4954117391,-0.2883231751,"https://salsa.debian.org/debian/darkslide","https://github.com/ionelmc/python-darkslide.git",4282.7612268519,4,56,0,42,23,0,0,55,3,"3",1.93333333333333,1.41818181818182,0.619661326744777,1.1908743922773,1,0,0 +"DartsPyLRU",-1.8927494334,0.2922334772,-2.3461638638,"https://salsa.debian.org/pkg-security-team/python-darts.lib.utils.lru","https://github.com/deterministic-arts/DartsPyLRU.git",362.9079398148,0,2,0,1,5,0,0,5,1,"1",2,2,-2.07664272314697,1.4142135623731,1,0,0 +"datrie",-0.50605789,1.3803188391,-0.9784823552,"https://salsa.debian.org/python-team/packages/python-datrie","https://github.com/kmike/datrie.git",2978.6536226852,7,11,0,14,90,0,2,92,2,"2",1.61111111111111,1.97826086956522,-0.277380056471669,1.40650661909755,1.02173913043478,0,0 +"python-dbusmock",-0.627944788,0.3000038238,-0.8505709773,"https://salsa.debian.org/python-team/packages/python-dbusmock","https://github.com/martinpitt/python-dbusmock",4100.7724189815,32,16,0,31,57,0,0,63,3,"3",1.33333333333333,1.9047619047619,0.494478794704953,1.38013111868471,1,1,0 +"decorator",0.4704212561,1.7923957087,0.0135959484,"https://salsa.debian.org/python-team/packages/python-decorator","https://github.com/micheles/decorator.git",5376.3999537037,6,23,0,23,131,0,0,131,4,"4",1.79310344827586,2,1.37192992263344,1.4142135623731,1,0,0 +"django-braces",-1.2510273472,0.3406489189,-1.6388153686,"https://salsa.debian.org/python-team/packages/python-django-braces","https://github.com/brack3t/django-braces.git",4108.7193865741,10,79,0,65,196,0,0,196,3,"3",1.8876404494382,2,0.499945183198407,1.4142135623731,1,1,0 +"django-cas",-1.1534352121,1.6719173633,-2.0695177654,"https://salsa.debian.org/python-team/packages/python-django-casclient","https://github.com/kstateome/django-cas",2792.0546875,7,19,0,16,53,0,0,54,2,"2",1.73076923076923,1.98148148148148,-0.405733703356662,1.40765105103555,1,1,0 +"django-extra-views",-1.2587713718,1.08523072,-1.8662212132,"https://salsa.debian.org/python-team/packages/python-django-extra-views","https://github.com/AndrewIngram/django-extra-views",4072.4001041667,12,61,1,51,205,0,0,208,3,"3",1.83561643835616,1.98557692307692,0.474962659345262,1.4091050078248,1,0,0 +"django-imagekit",-1.3510241486,0.3749851789,-1.7864034212,"https://salsa.debian.org/python-team/packages/python-django-imagekit","https://github.com/matthewwithanm/django-imagekit.git",5386.1103935185,18,69,0,65,458,0,0,463,4,"4",1.79310344827586,1.98920086393089,1.37860933032593,1.41039032325484,1,0,0 +"django-modelcluster",-3.9620317451,-2.0344269896,-4.3414266404,"https://salsa.debian.org/python-team/packages/python-django-modelcluster","https://github.com/wagtail/django-modelcluster.git",3534.2000347222,21,13,0,29,118,0,0,119,2,"2",1.38235294117647,1.99159663865546,0.10475721525526,1.41123939806663,1,0,0 +"django-rest-framework-guardian",-3.3209075154,-1.1464196518,-3.751236078,"https://salsa.debian.org/python-team/packages/python-django-rest-framework-guardian","https://github.com/rpkilby/django-rest-framework-guardian.git",626.7550231481,2,4,0,4,14,0,0,14,1,"1",1.66666666666667,2,-1.89515328789276,1.4142135623731,1,1,0 +"django-rest-hooks",-1.5050875724,1.1869723949,-2.1906025512,"https://salsa.debian.org/python-team/packages/python-django-rest-hooks","https://github.com/zapier/django-rest-hooks",2693.6027777778,12,13,0,20,56,0,0,57,1,"1",1.52,1.98245614035088,-0.473454677450618,1.40799720892865,1,1,0 +"django-split-settings",-2.7895751152,-0.3987847133,-3.3101515707,"https://salsa.debian.org/python-team/packages/python-django-split-settings","https://github.com/sobolevn/django-split-settings",3860.1584027778,17,13,0,20,39,0,0,46,3,"3",1.43333333333333,1.84782608695652,0.328970420068529,1.3593476696403,1,1,0 +"django-storages",-3.1386978641,-0.5967779923,-3.725863839,"https://salsa.debian.org/python-team/packages/python-django-storages","https://github.com/jschneier/django-storages.git",4486.1115740741,175,96,0,225,717,0,2,835,3,"3",1.35424354243542,1.85868263473054,0.759537573280664,1.36333511461069,1.00239520958084,0,0 +"django-treebeard",-1.4430134685,-0.7351656258,-1.6842741632,"https://salsa.debian.org/python-team/packages/python-django-treebeard","https://github.com/django-treebeard/django-treebeard.git",5493.911400463,24,59,0,65,267,0,0,278,4,"4",1.71084337349398,1.96043165467626,1.4527611595712,1.40015415389744,1,1,0 +"python-dmidecode",0.6965127554,2.3773186195,-0.1244349613,"https://salsa.debian.org/python-team/packages/python-dmidecode","https://github.com/nima/python-dmidecode",5342.5758333333,10,17,0,11,26,0,0,28,4,"4",1.62962962962963,1.92857142857143,1.34866371697204,1.38873014965883,1,0,0 +"dnsq",-0.8493777922,1.6513810932,-1.4106021621,"https://salsa.debian.org/python-team/packages/python-dnsq","https://github.com/mailgun/dnsq.git",1028.9045138889,1,6,0,4,14,0,0,15,1,"1",1.85714285714286,1.93333333333333,-1.61853137856464,1.39044357430761,1,0,0 +"python-dotenv",-0.0646647075,2.8616640278,-0.9758026604,"https://salsa.debian.org/debian/python-dotenv","https://github.com/theskumar/python-dotenv.git",3676.0798726852,81,18,0,84,565,0,1,569,2,"2",1.18181818181818,1.99297012302285,0.202350455023368,1.41172593764613,1.00175746924429,1,0 +"dpkt",0.019610667,2.4762696052,-0.5848881328,"https://salsa.debian.org/python-team/packages/python-dpkt","https://github.com/kbandla/dpkt",3886.9183680556,36,43,1,56,220,0,1,222,3,"3",1.54430379746835,1.99099099099099,0.347377487239156,1.41102480169237,1.0045045045045,1,0 +"dropbox-sdk-python",-0.1301813578,2.8452134881,-0.8655819935,"https://salsa.debian.org/python-team/packages/python-dropbox","https://github.com/dropbox/dropbox-sdk-python",2984.0770833333,28,31,0,31,49,0,0,71,2,"2",1.52542372881356,1.69014084507042,-0.273649483452964,1.30005417005232,1,0,0 +"python-dugong",-0.5914713911,0.3761740468,-0.8252986097,"https://salsa.debian.org/python-team/packages/python-dugong","https://github.com/python-dugong/python-dugong.git",3200.2688541667,4,5,0,7,9,0,0,11,2,"2",1.55555555555556,1.81818181818182,-0.124940155688309,1.34839972492648,1,0,0 +"easydev",-1.0634186539,0.4092421308,-1.417126244,"https://salsa.debian.org/python-team/packages/python-easydev","https://github.com/cokelaer/easydev.git",3717.344375,0,5,0,1,10,0,0,10,2,"2",2,2,0.23073458997967,1.4142135623731,1,0,0 +"easywebdav",-0.193448412,1.9590581698,-0.6371910366,"https://salsa.debian.org/python-team/packages/python-easywebdav","https://github.com/amnong/easywebdav",813.3765625,1,13,0,8,75,0,0,75,1,"1",1.92857142857143,2,-1.7667840925416,1.4142135623731,1,1,0 +"exif-py",0.0156493175,1.0036035588,-0.2489350249,"https://salsa.debian.org/python-team/packages/python-exif","https://github.com/ianare/exif-py",3998.0291898148,34,23,0,51,195,0,0,195,3,"3",1.40350877192982,2,0.423806000440624,1.4142135623731,1,0,0 +"fabio",0.0104950221,1.2100758664,-0.4380511126,"https://salsa.debian.org/science-team/python-fabio","https://github.com/silx-kit/fabio.git",5765.1214351852,18,45,0,33,54,0,0,60,4,"4",1.71428571428571,1.9,1.6393152628615,1.37840487520902,1,0,0 +"fitsio",-0.4610557174,0.3940574407,-0.637876907,"https://salsa.debian.org/debian-astro-team/python-fitsio","https://github.com/esheldon/fitsio",4439.4105671296,4,32,0,25,107,0,0,108,3,"3",1.88888888888889,1.99074074074074,0.727413892893214,1.41093612213337,1,1,0 +"flaky",-0.8238726702,2.0811606782,-1.6526698831,"https://salsa.debian.org/python-team/packages/python-flaky","https://github.com/box/flaky.git",3089.6002083333,11,23,0,21,145,0,0,145,2,"2",1.67647058823529,2,-0.201064514460465,1.4142135623731,1,0,0 +"fysom",-0.7585603333,1.38289184,-1.1858234109,"https://salsa.debian.org/debian/python-fysom","https://github.com/mriehl/fysom.git",3641.9876967593,3,22,0,13,39,0,0,40,2,"2",1.88,1.975,0.178899865093737,1.40534693225552,1,0,0 +"genty",-1.5312416046,1.7202436984,-2.3792600782,"https://salsa.debian.org/python-team/packages/python-genty","https://github.com/box/genty.git",701.8032986111,0,10,0,5,15,0,0,15,1,"1",2,2,-1.84353070045117,1.4142135623731,1,0,0 +"glad",-1.3457272309,1.093467749,-1.9015379081,"https://salsa.debian.org/python-team/packages/glad","https://github.com/Dav1dde/glad.git",3530.1536458333,54,19,0,28,255,0,3,266,2,"2",1.26027397260274,1.95864661654135,0.101973872627448,1.39951656529723,1.01127819548872,1,0 +"python-gnupg",0.3458917214,1.220869917,-0.050061794,"https://salsa.debian.org/python-team/packages/python-gnupg","https://github.com/vsajip/python-gnupg.git",3594.9863773148,6,12,0,14,52,0,0,58,2,"2",1.66666666666667,1.89655172413793,0.146569612227499,1.37715348604937,1,0,0 +"gnuplotlib",-0.5540723096,1.9911774543,-1.1225767623,"https://salsa.debian.org/python-team/packages/python-gnuplotlib","https://github.com/dkogan/gnuplotlib",3062.559849537,1,2,0,2,29,0,0,29,2,"2",1.66666666666667,2,-0.219664452670933,1.4142135623731,1,0,0 +"graphviz",-0.2775267395,1.2889253499,-0.6503415057,"https://salsa.debian.org/python-team/packages/python-graphviz","https://github.com/xflr6/graphviz",3612.6320833333,12,12,0,22,48,0,0,60,2,"2",1.5,1.8,0.15870735951468,1.34164078649987,1,0,0 +"greenlet",0.8047616843,1.7061049423,0.3070462935,"https://salsa.debian.org/python-team/packages/python-greenlet","https://github.com/python-greenlet/greenlet",5315.6529166667,21,53,1,60,350,0,0,351,4,"4",1.71621621621622,1.997150997151,1.33014456231818,1.41320592878427,1,0,0 +"python-gssapi",0.3289179765,2.3550255223,-0.2500485627,"https://salsa.debian.org/python-team/packages/python-gssapi","https://github.com/pythongssapi/python-gssapi",3263.0338078704,18,17,0,25,97,0,0,99,2,"2",1.48571428571429,1.97979797979798,-0.0817667544229585,1.4070529413629,1,0,0 +"h11",0.0628463609,2.5298903305,-0.3966248627,"https://salsa.debian.org/python-team/packages/python-h11","https://github.com/python-hyper/h11.git",2700.4708217593,21,14,0,28,99,0,0,99,1,"1",1.4,2,-0.468730435636927,1.4142135623731,1,0,0 +"httplib2",0.5220301337,1.5281004855,0.118057713,"https://salsa.debian.org/python-team/packages/python-httplib2","https://github.com/httplib2/httplib2.git",5422.7818402778,50,36,0,58,150,0,9,186,4,"4",1.41860465116279,1.80645161290323,1.40383409339027,1.34404301006449,1.04838709677419,1,0 +"httptools",-1.016257232,1.5255190337,-1.6306842731,"https://salsa.debian.org/python-team/packages/python-httptools","https://github.com/MagicStack/httptools.git",2908.9019444445,11,7,0,15,96,0,0,97,2,"2",1.38888888888889,1.98969072164948,-0.325359334968927,1.41056397290215,1,1,0 +"idna",0.428827323,2.3998733008,0.0023232441,"https://salsa.debian.org/python-team/packages/python-idna","https://github.com/kjd/idna",3836.1993865741,12,16,2,22,107,0,0,107,3,"3",1.57142857142857,2,0.312490009274816,1.4142135623731,1,0,0 +"ijson",-0.7882494907,1.6183503032,-1.3435678266,"https://salsa.debian.org/debian/python-ijson","https://github.com/ICRAR/ijson.git",4844.9471180556,7,21,0,19,91,0,0,100,3,"3",1.75,1.91,1.00636562005528,1.38202749610853,1,0,0 +"intervaltree-bio",-0.5864931947,1.6648991521,-1.1805901394,"https://salsa.debian.org/med-team/python-intervaltree-bio","https://github.com/konstantint/intervaltree-bio.git",961.9282638889,0,5,0,4,7,0,0,7,1,"1",2,2,-1.66460155540487,1.4142135623731,1,0,0 +"ipaddress",0.6123592223,3.1947690745,-0.0003839016,"https://salsa.debian.org/python-team/modules/python-ipaddress","https://github.com/phihag/ipaddress",2728.476099537,1,7,0,6,56,0,0,56,1,"1",1.875,2,-0.449466769790027,1.4142135623731,1,0,0 +"python-ipcalc",0.7141016308,3.4398389904,-0.255334424,"https://github.com/craneworks/python-ipcalc","https://github.com/craneworks/python-ipcalc",756.8280324074,1,1,0,0,1,0,0,1,1,"1",1.5,2,-1.80568147454524,1.4142135623731,1,0,0 +"python-iptables",-1.3768945792,-0.1620145007,-1.5972298957,"https://salsa.debian.org/python-team/packages/python-iptables","https://github.com/ldx/python-iptables",4469.2364236111,3,51,0,40,238,0,0,240,3,"3",1.94444444444444,1.99166666666667,0.747929859112792,1.41126420866777,1,1,0 +"python-isc-dhcp-leases",-1.2144164676,1.3723753572,-1.7887539722,"https://salsa.debian.org/python-team/packages/python-isc-dhcp-leases","https://github.com/MartijnBraam/python-isc-dhcp-leases",3184.8126041667,4,9,0,8,31,0,0,31,2,"2",1.69230769230769,2,-0.135571867239594,1.4142135623731,1,0,0 +"itsdangerous",0.6642302819,3.2169189216,-0.0415160477,"https://salsa.debian.org/python-team/packages/python-itsdangerous","https://github.com/pallets/itsdangerous",4546.9291435185,24,19,0,40,182,0,0,188,3,"3",1.44186046511628,1.96808510638298,0.801371449905536,1.40288456630721,1,0,0 +"jellyfish",0.0674101012,2.0051276836,-0.4205869787,"https://salsa.debian.org/python-team/packages/python-jellyfish","https://github.com/jamesturk/jellyfish",4902.3308101852,15,24,0,27,148,0,0,148,3,"3",1.61538461538462,2,1.04583747528988,1.4142135623731,1,1,0 +"jira",-0.3980829938,2.423176583,-1.0411208861,"https://salsa.debian.org/python-team/packages/python-jira","https://github.com/pycontribs/jira",4267.40125,111,155,3,195,572,0,0,670,3,"3",1.58270676691729,1.85373134328358,0.609095837488079,1.36151802899689,1,0,0 +"jmespath.py",0.3629172949,2.0686645362,-0.1003834425,"https://salsa.debian.org/python-team/packages/python-jmespath","https://github.com/jmespath/jmespath.py",3691.1897222222,12,21,0,28,14,0,1,37,2,"2",1.63636363636364,1.37837837837838,0.212743892102914,1.17404360156613,1.02702702702703,0,0 +"josepy",0.3513511179,2.2923963637,-0.0869215969,"https://salsa.debian.org/letsencrypt-team/certbot/josepy","https://github.com/certbot/josepy",4184.7847685185,104,276,0,285,46,0,0,308,3,"3",1.72631578947368,1.14935064935065,0.552267395887207,1.07207772542416,1,0,0 +"python-junit-xml",-0.4874384495,3.2461576764,-1.4580304291,"https://salsa.debian.org/python-team/packages/python-junit-xml","https://github.com/kyrus/python-junit-xml.git",2595.0297685185,5,18,0,13,67,0,0,69,1,"1",1.78260869565217,1.97101449275362,-0.541258950879627,1.40392823632607,1,0,0 +"kajiki",-2.3594950912,-1.2299434314,-2.6159157482,"https://salsa.debian.org/python-team/packages/python-kajiki","https://github.com/jackrosenthal/kajiki",4546.9668518519,3,22,0,18,30,0,0,33,3,"3",1.88,1.90909090909091,0.801397387899797,1.38169855941551,1,0,0 +"kaptan",-0.238361389,2.3964025525,-0.8063707104,"https://salsa.debian.org/debian/python-kaptan","https://github.com/emre/kaptan.git",3814.6996064815,6,17,0,16,32,0,0,32,3,"3",1.73913043478261,2,0.297701204722573,1.4142135623731,1,0,0 +"python-libarchive-c",0.2084355293,1.8864921166,-0.3011849402,"https://salsa.debian.org/debian/python-libarchive-c","https://github.com/Changaco/python-libarchive-c.git",3365.1853587963,15,18,0,22,69,0,0,71,2,"2",1.54545454545455,1.97183098591549,-0.0115009510126431,1.40421899499882,1,0,0 +"libnacl",-0.5748525142,1.055075496,-0.9944771692,"https://salsa.debian.org/python-team/packages/python-libnacl","https://github.com/saltstack/libnacl.git",3360.8544791667,4,45,0,34,71,0,0,72,2,"2",1.91836734693878,1.98611111111111,-0.0144799829890442,1.40929454377398,1,0,0 +"python-libusb1",0.2265462586,3.5735295241,-0.6911313873,"https://salsa.debian.org/python-team/packages/python-libusb1","https://github.com/vpelletier/python-libusb1.git",5022.3082060185,13,14,0,21,84,0,0,85,4,"4",1.51851851851852,1.98823529411765,1.12836493603709,1.41004797582127,1,0,0 +"python-lz4",0.2828189113,1.8016304752,-0.1138420548,"https://salsa.debian.org/python-team/packages/python-lz4","https://github.com/python-lz4/python-lz4.git",3988.215625,8,43,0,37,148,0,0,158,3,"3",1.84313725490196,1.93670886075949,0.417055657349589,1.39165687608674,1,1,0 +"python-lzo",0.6457852422,3.6246917685,-0.1788164823,"https://salsa.debian.org/python-team/packages/python-lzo","https://github.com/jd-boyd/python-lzo",4282.0784259259,2,13,0,10,69,0,0,70,3,"3",1.86666666666667,1.98571428571429,0.619191656385396,1.40915374807517,1,1,0 +"python-mapnik",-0.22946102,0.3549703224,-0.441137685,"https://salsa.debian.org/debian-gis-team/python-mapnik","https://github.com/mapnik/python-mapnik.git",5494.8782638889,10,101,0,63,101,0,0,150,4,"4",1.90990990990991,1.67333333333333,1.45342622471013,1.29357386079548,1,1,0 +"MechanicalSoup",-0.5139427981,1.6546261984,-1.0099675897,"https://salsa.debian.org/python-team/packages/python-mechanicalsoup","https://github.com/hickford/MechanicalSoup",3488.7486574074,39,28,0,46,149,0,0,164,2,"2",1.41791044776119,1.90853658536585,0.0734931031181227,1.38149794982325,1,0,0 +"mechanize",0.5587118446,1.5296801165,0.1098543172,"https://salsa.debian.org/python-team/packages/python-mechanize","https://github.com/python-mechanize/mechanize.git",5735.6054513889,5,12,0,14,81,0,0,548,4,"4",1.70588235294118,1.1478102189781,1.6190124451745,1.07135905231538,1,0,0 +"meld3",1.4808008162,4.1711738218,0.4100529738,"https://salsa.debian.org/python-team/packages/python-meld3","https://github.com/supervisor/meld3.git",4279.117650463,0,8,0,7,27,0,0,27,3,"3",2,2,0.617155062082788,1.4142135623731,1,0,0 +"PyMemoize",-1.6877152559,1.1203038488,-2.4079093642,"https://salsa.debian.org/debian/python-memoize","https://github.com/mikeboers/PyMemoize",4629.8626388889,2,6,0,5,18,0,0,19,3,"3",1.75,1.94736842105263,0.85841795217601,1.39548142984872,1,1,0 +"memprof",-1.0055408653,0.6195771117,-1.559509906,"https://salsa.debian.org/python-team/packages/python-memprof","https://github.com/jmdana/memprof",2110.1480324074,1,8,0,5,18,0,0,18,1,"1",1.88888888888889,2,-0.874788930973121,1.4142135623731,1,0,0 +"MIDIUtil",-0.4550519333,2.0970578814,-0.9760105027,"https://salsa.debian.org/multimedia-team/python-midiutil","https://github.com/MarkCWirt/MIDIUtil.git",532.2564583333,2,4,0,2,47,0,0,47,1,"1",1.66666666666667,2,-1.96015492044409,1.4142135623731,1,0,0 +"python-miio",-2.4535132218,0.0572909827,-2.9975615853,"https://salsa.debian.org/python-team/packages/miio","https://github.com/rytilahti/python-miio.git",2467.2539236111,163,5,0,156,136,0,0,270,1,"1",1.0297619047619,1.5037037037037,-0.629150640408287,1.22625596989524,1,1,0 +"python-mimeparse",0.635087679,2.3635412747,-0.0635295991,"https://salsa.debian.org/python-team/modules/python-mimeparse","https://github.com/dbtsai/python-mimeparse.git",3368.8721296296,9,11,0,12,20,0,0,23,2,"2",1.55,1.8695652173913,-0.00896497468880402,1.36732045161012,1,0,0 +"motor",-1.6905579654,-0.1116236972,-2.117236641,"https://salsa.debian.org/python-team/packages/python-motor","https://github.com/mongodb/motor",3986.9431365741,28,30,0,47,2,0,0,47,3,"3",1.51724137931034,1.04255319148936,0.416180365484064,1.02105494048526,1,1,0 +"pymox",-0.4239911007,2.121473449,-1.1839102652,"https://salsa.debian.org/debian/python-mox","https://github.com/ivancrneto/pymox",3025.5165856482,3,7,0,5,8,0,0,10,2,"2",1.7,1.8,-0.245144973274825,1.34164078649987,1,1,0 +"python-mpd2",-0.2990738247,0.3266786344,-0.4283928832,"https://salsa.debian.org/mpd-team/python-mpd","https://github.com/Mic92/python-mpd2",5765.5434143519,16,38,0,43,139,0,0,139,4,"4",1.7037037037037,2,1.6396055247802,1.4142135623731,1,0,0 +"mplexporter",-0.1464208389,2.3064325181,-0.9188944106,"https://salsa.debian.org/python-team/packages/python-mplexporter","https://github.com/mpld3/mplexporter",3220.5932523148,4,24,0,17,29,0,0,31,2,"2",1.85714285714286,1.93548387096774,-0.110959847491683,1.3912166872805,1,1,0 +"pynacl",0.3194025143,1.5580852197,-0.0692227421,"https://salsa.debian.org/python-team/packages/python-nacl","https://github.com/pyca/pynacl",3948.360462963,44,26,1,61,44,0,0,91,3,"3",1.37142857142857,1.48351648351648,0.389640948956081,1.21799691441173,1,0,0 +"python-nameparser",-2.0123667482,0.1499038072,-2.4759914091,"https://salsa.debian.org/python-team/packages/python-nameparser","https://github.com/derek73/python-nameparser",4612.1091203704,9,18,1,23,121,0,0,123,3,"3",1.66666666666667,1.98373983739837,0.84620604515399,1.40845299438724,1,0,0 +"nest_asyncio",-3.3220087743,0.2652013224,-4.2429827404,"https://salsa.debian.org/python-team/packages/python-nest-asyncio","https://github.com/erdewit/nest_asyncio",1907.2440740741,4,10,0,12,92,0,0,92,1,"1",1.71428571428571,2,-1.0143581251576,1.4142135623731,1,0,0 +"python-networkmanager",-0.3294740738,1.4731534732,-0.9543699399,"https://salsa.debian.org/python-team/packages/python-networkmanager","https://github.com/seveas/python-networkmanager",4090.3196759259,12,3,0,11,104,0,0,104,3,"3",1.2,2,0.487288787485424,1.4142135623731,1,0,0 +"oauthlib",0.3884344854,2.2364514825,-0.0809544139,"https://salsa.debian.org/python-team/packages/python-oauthlib","https://github.com/oauthlib/oauthlib",4357.2754050926,51,167,2,168,249,0,0,316,3,"3",1.76605504587156,1.7879746835443,0.670916530920191,1.3371517055085,1,0,0 +"odfpy",-0.1752613644,1.26653294,-0.4678571818,"https://salsa.debian.org/python-team/packages/python-odf","https://github.com/eea/odfpy",4744.619375,6,27,0,24,129,0,10,140,3,"3",1.81818181818182,1.92142857142857,0.937354338226979,1.38615604151501,1.07142857142857,1,0 +"python-pam",0.7194661619,3.5092607756,-0.0318286678,"https://salsa.debian.org/python-team/packages/python-pampy","https://github.com/FirefighterBlu3/python-pam",2926.9394907408,2,10,0,8,42,0,0,42,2,"2",1.83333333333333,2,-0.312952057051241,1.4142135623731,1,1,0 +"pandocfilters",0.4325771732,2.9731648905,-0.1436774117,"https://salsa.debian.org/python-team/packages/python-pandocfilters","https://github.com/jgm/pandocfilters",2924.0615740741,12,31,0,34,69,0,0,74,2,"2",1.72093023255814,1.93243243243243,-0.314931656234031,1.39011957486845,1,0,0 +"parameterized",-0.0852476016,1.7634629159,-0.4735189307,"https://salsa.debian.org/python-team/packages/python-parameterized","https://github.com/wolever/parameterized",4033.873125,6,29,0,26,199,0,0,201,3,"3",1.82857142857143,1.99004975124378,0.448461552709256,1.4106912317172,1,0,0 +"parse_type",-0.7766894785,2.2657323306,-1.6027471957,"https://salsa.debian.org/python-team/packages/python-parse-type","https://github.com/jenisys/parse_type",3544.3490162037,0,4,0,1,16,0,0,16,2,"2",2,2,0.111738277521376,1.4142135623731,1,0,0 +"periodictable",-1.0615188189,0.0399913751,-1.3403053026,"https://salsa.debian.org/science-team/python-periodictable","https://github.com/pkienzle/periodictable.git",5457.176412037,0,18,0,9,27,0,0,27,4,"4",2,2,1.42749268883702,1.4142135623731,1,0,0 +"pex",-0.7476267621,1.4651691422,-1.6685430991,"https://salsa.debian.org/python-team/packages/python-pex","https://github.com/pantsbuild/pex.git",3433.3294212963,95,47,0,104,155,0,0,220,2,"2",1.33098591549296,1.70454545454545,0.0353725154771468,1.30558241966773,1,0,0 +"python-pgpdump",-0.1879378602,2.3259223777,-0.7707539804,"https://salsa.debian.org/python-team/packages/python-pgpdump","https://github.com/toofishes/python-pgpdump",826.806712963,5,2,0,5,24,0,0,24,1,"1",1.28571428571429,2,-1.75754605059656,1.4142135623731,1,1,0 +"PGPy",-0.2430201905,2.4059068222,-1.197889114,"https://salsa.debian.org/debian/pgpy","https://github.com/SecurityInnovation/PGPy",3246.9911458333,11,33,2,35,91,0,1,103,2,"2",1.75,1.88349514563107,-0.0928018344257544,1.37240487671498,1.00970873786408,0,0 +"pgspecial",0.3830684523,3.0333672127,-0.3897890378,"https://salsa.debian.org/python-team/packages/python-pgspecial","https://github.com/dbcli/pgspecial",2959.9866319445,21,33,0,38,60,0,0,60,2,"2",1.61111111111111,2,-0.290220303044133,1.4142135623731,1,0,0 +"phply",-0.0136994366,0.8386196269,-0.2146141125,"https://salsa.debian.org/debian/python-phply","https://github.com/viraptor/phply.git",4545.3284143519,2,13,0,9,35,0,0,37,3,"3",1.86666666666667,1.94594594594595,0.80027037488598,1.39497166492583,1,1,0 +"picklable-itertools",-1.9017855155,0.0686564891,-2.3399948958,"https://salsa.debian.org/python-team/packages/python-picklable-itertools","https://github.com/mila-iqia/picklable-itertools",176.1980324074,0,5,0,3,4,0,0,4,1,"1",2,2,-2.20507270320829,1.4142135623731,1,0,0 +"pika",0.6194442951,2.792024793,-0.1295291186,"https://salsa.debian.org/python-team/packages/python-pika","https://github.com/pika/pika",5099.3438078704,52,181,1,165,190,0,0,319,4,"4",1.77682403433476,1.59561128526646,1.18135452264892,1.26317508100281,1,0,0 +"pyftpdlib",-0.1028969973,1.6271806139,-0.7069948318,"https://salsa.debian.org/python-team/packages/python-pyftpdlib","https://github.com/giampaolo/pyftpdlib",5695.2602314815,16,22,1,30,82,0,0,100,4,"4",1.57894736842105,1.82,1.59126064635339,1.3490737563232,1,0,0 +"pynvim",0.1793262124,2.0167259674,-0.2014913603,"https://salsa.debian.org/python-team/packages/python-pynvim","https://github.com/neovim/pynvim",3504.5291782407,26,35,0,55,243,0,0,250,2,"2",1.57377049180328,1.972,0.084347867089248,1.40427917452336,1,1,0 +"pyotp",-0.1936486463,2.043929727,-0.7744180298,"https://salsa.debian.org/python-team/packages/python-pyotp","https://github.com/pyauth/pyotp.git",4631.6125462963,26,20,0,33,124,0,0,130,3,"3",1.43478260869565,1.95384615384615,0.859621640703107,1.39780046996921,1,0,0 +"pyperclip",0.520944025,2.1523556396,-0.0782247035,"https://salsa.debian.org/sramacher/python-pyperclip","https://github.com/asweigart/pyperclip",3772.0925925926,7,31,0,31,330,0,0,330,3,"3",1.81578947368421,2,0.268393611889355,1.4142135623731,1,1,0 +"pyproj",-0.1814047386,0.2461708969,-0.2576178377,"https://salsa.debian.org/debian-gis-team/python-pyproj","https://github.com/pyproj4/pyproj.git",5681.2389236111,30,46,0,61,327,0,0,350,4,"4",1.60526315789474,1.93428571428571,1.58161597181398,1.3907860059282,1,1,0 +"pypubsub",-1.763743949,-0.068250645,-2.0677092705,"https://salsa.debian.org/python-team/packages/python-pypubsub","https://github.com/schollii/pypubsub",1788.0433680556,4,5,0,6,42,0,0,42,1,"1",1.55555555555556,2,-1.09635133328365,1.4142135623731,1,0,0 +"pyramid_multiauth",-1.9341240314,0.3100051717,-2.4480383752,"https://github.com/douardda/pyramid_multiauth","https://github.com/douardda/pyramid_multiauth",1636.4991203704,0,10,0,6,0,0,0,6,1,"1",2,1,-1.20059231855794,1,1,0,0 +"pysnmp",0.6296288884,1.9466089716,0.0848638325,"https://salsa.debian.org/python-team/packages/python-pysnmp4","https://github.com/etingof/pysnmp",4346.8111226852,17,11,0,21,393,0,0,394,3,"3",1.39285714285714,1.99746192893401,0.663718586260479,1.41331593387112,1,1,0 +"qtpy",0.3491974082,2.2294676618,-0.1435114165,"https://salsa.debian.org/python-team/packages/python-qtpy","https://github.com/spyder-ide/qtpy",3201.4270949074,20,62,3,59,61,0,1,101,2,"2",1.75609756097561,1.6039603960396,-0.124143450053884,1.26647558051453,1.00990099009901,1,0 +"python-quantities",-0.0106025798,1.9580121766,-0.690445939,"https://salsa.debian.org/science-team/python-quantities","https://github.com/python-quantities/python-quantities.git",5020.6635069445,7,39,0,28,134,0,0,135,4,"4",1.84782608695652,1.99259259259259,1.12723361594694,1.41159221894731,1,0,0 +"PythonQwt",0.5933841457,3.6301488353,-0.4097779828,"https://salsa.debian.org/science-team/python-qwt","https://github.com/PierreRaybaut/PythonQwt.git",1193.9426967593,2,6,0,5,29,0,0,29,1,"1",1.75,2,-1.50500847648771,1.4142135623731,1,1,0 +"rarfile",0.2024927767,3.0961464994,-0.5861303229,"https://salsa.debian.org/python-team/packages/python-rarfile","https://github.com/markokr/rarfile.git",5495.9042361111,8,13,0,16,102,0,0,103,4,"4",1.61904761904762,1.99029126213592,1.45413194833171,1.41077682931636,1,0,0 +"rdflib-jsonld",-0.0904254945,1.6642685449,-0.4956744476,"https://salsa.debian.org/python-team/packages/python-rdflib-jsonld","https://github.com/RDFLib/rdflib-jsonld",3605.0071180556,4,18,0,13,106,0,0,106,2,"2",1.81818181818182,2,0.153462463021606,1.4142135623731,1,1,0 +"readme_renderer",-0.1456681528,2.207631483,-0.5831215172,"https://salsa.debian.org/python-team/packages/python-readme-renderer","https://github.com/pypa/readme_renderer",3479.9030902778,12,22,0,30,133,0,0,141,2,"2",1.64705882352941,1.94326241134752,0.0674086053758213,1.39400947319145,1,0,0 +"restless",-1.933361243,-0.9031369663,-2.2877460686,"https://salsa.debian.org/python-team/packages/python-restless","https://github.com/toastdriven/restless",2872.2400231482,8,30,0,30,106,0,0,106,2,"2",1.78947368421053,2,-0.350577545863433,1.4142135623731,1,0,0 +"rply",-0.0320431964,1.7010393246,-0.4724323632,"https://salsa.debian.org/python-team/packages/python-rply","https://github.com/alex/rply",3096.8436689815,9,17,0,21,76,0,0,76,2,"2",1.65384615384615,2,-0.196082039135289,1.4142135623731,1,0,0 +"python-rsa",0.3772367225,1.9634900436,-0.1098199505,"https://salsa.debian.org/python-team/packages/python-rsa","https://github.com/sybrenstuvel/python-rsa",5670.1946296296,33,16,2,36,126,0,0,139,4,"4",1.3265306122449,1.90647482014388,1.57401906131506,1.38075154178581,1,1,0 +"rtree",-0.1090383067,2.131754724,-0.531642492,"https://salsa.debian.org/debian-gis-team/python-rtree","https://github.com/Toblerity/rtree.git",5739.5775925926,25,24,0,39,225,0,1,231,4,"4",1.48979591836735,1.97402597402597,1.62174471590761,1.40500034662842,1.004329004329,1,0 +"s3transfer",0.3673618005,2.5341337999,-0.1810184019,"https://salsa.debian.org/python-team/packages/python-s3transfer","https://github.com/boto/s3transfer",2891.8518634259,24,28,0,32,161,0,0,165,2,"2",1.53846153846154,1.97575757575758,-0.337087376590654,1.40561643977209,1,0,0 +"sabyenc",0.4522797507,3.6365145505,-0.3981014069,"https://salsa.debian.org/python-team/packages/python-sabyenc","https://github.com/sabnzbd/sabyenc.git",2872.8934606482,9,4,0,8,28,0,0,28,2,"2",1.30769230769231,2,-0.350128073383576,1.4142135623731,1,1,0 +"scandir",0.8273012672,3.7868324648,0.0056074744,"https://salsa.debian.org/python-team/packages/python-scandir","https://github.com/benhoyt/scandir",3760.0535185185,8,20,0,22,123,0,0,123,2,"2",1.71428571428571,2,0.26011243353753,1.4142135623731,1,0,0 +"scrapy-djangoitem",-1.8401324548,0.5412820006,-2.4359072724,"https://salsa.debian.org/python-team/packages/python-scrapy-djangoitem","https://github.com/scrapy-plugins/scrapy-djangoitem",2837.1132523148,0,13,0,10,26,0,0,32,2,"2",2,1.8125,-0.374739790601248,1.34629120178363,1,0,0 +"scruffy",-0.8950842584,1.9677123819,-1.6884452058,"https://salsa.debian.org/python-team/packages/python-scruffy","https://github.com/snare/scruffy",1665.7056828704,2,5,0,4,9,0,1,10,1,"1",1.71428571428571,1.9,-1.18050233891187,1.37840487520902,1.1,0,0 +"secretstorage",0.3387544545,2.1308358714,-0.0585012825,"https://salsa.debian.org/python-team/packages/python-secretstorage","https://github.com/mitya57/secretstorage",3916.1693055556,4,7,0,7,50,0,0,50,3,"3",1.63636363636364,2,0.367497990602178,1.4142135623731,1,0,0 +"serverfiles",-3.270914062,-0.0867153,-4.1789525946,"https://salsa.debian.org/python-team/packages/python-serverfiles","https://github.com/biolab/serverfiles",2007.9058333333,1,6,0,6,0,0,0,6,1,"1",1.85714285714286,1,-0.945117087474536,1,1,0,0 +"setoptconf",-0.6718962402,1.1532142556,-1.127131302,"https://salsa.debian.org/python-team/packages/python-setoptconf","https://github.com/jayclassless/setoptconf.git",2788.0056365741,0,3,0,2,3,0,0,3,2,"2",2,2,-0.408518877089012,1.4142135623731,1,0,0 +"py-setproctitle",1.0838445468,3.2588810317,0.2442150847,"https://salsa.debian.org/python-team/packages/python-setproctitle","https://github.com/dvarrazzo/py-setproctitle",5054.5442361111,9,10,0,12,86,0,0,89,4,"4",1.52631578947368,1.96629213483146,1.15053876044489,1.40224539037626,1,0,0 +"python-sfml",-0.3784249777,0.2624085655,-0.5818259297,"https://salsa.debian.org/games-team/python-sfml","https://github.com/intjelic/python-sfml",3326.0384143519,1,21,2,14,97,0,5,107,2,"2",1.95454545454545,1.90654205607477,-0.038428505978892,1.38077588915608,1.04672897196262,1,0 +"sh",0.0684316621,2.7449205881,-0.5744266283,"https://salsa.debian.org/python-team/packages/python-sh","https://github.com/amoffat/sh",4327.6361689815,29,75,2,77,438,0,0,456,3,"3",1.72115384615385,1.96052631578947,0.65052893309189,1.40018795730769,1,0,0 +"python-slugify",-0.1216991783,1.414032002,-0.4325012299,"https://salsa.debian.org/python-team/packages/python-slugify","https://github.com/un33k/python-slugify",4027.6128240741,29,16,0,32,109,0,0,111,3,"3",1.35555555555556,1.98198198198198,0.444155352067546,1.40782881842289,1,1,0 +"socketIO-client",0.9390849724,4.9112952662,-0.4668774995,"https://salsa.debian.org/debian/python-socketio-client","https://github.com/invisibleroads/socketIO-client",1970.3003472222,0,39,2,22,294,0,0,294,1,"1",2,2,-0.970984337362389,1.4142135623731,1,0,0 +"PySocks",1.0550621894,3.7043852987,0.1526077193,"https://salsa.debian.org/python-team/packages/python-socksipy","https://github.com/Anorov/PySocks",2386.177962963,3,31,0,28,172,0,0,173,1,"1",1.91176470588235,1.99421965317919,-0.684919421797953,1.41216842238424,1,0,0 +"python-systemd",0.186853671,1.4520714492,-0.0787581662,"https://salsa.debian.org/systemd-team/python-systemd","https://github.com/systemd/python-systemd",3925.6328356482,47,10,0,47,124,0,0,134,3,"3",1.17543859649123,1.92537313432836,0.374007559365716,1.38757815431361,1,1,0 +"python-tabulate",0.4140804306,2.807860448,-0.2305820053,"https://salsa.debian.org/python-team/packages/python-tabulate","https://github.com/astanin/python-tabulate.git",3791.7183796296,22,72,0,74,329,0,0,365,3,"3",1.76595744680851,1.9013698630137,0.281893374557813,1.37890168721838,1,1,0 +"tasklib",0.0418096657,2.4101943872,-0.7381367832,"https://salsa.debian.org/tasktools-team/python-tasklib","https://github.com/GothenburgBitFactory/tasklib.git",3516.4481481482,7,15,0,12,63,0,0,64,2,"2",1.68181818181818,1.984375,0.092546430779988,1.40867845869808,1,0,0 +"tesserocr",-0.0713400087,2.5040315407,-0.9645789788,"https://salsa.debian.org/python-team/packages/python-tesserocr","https://github.com/sirfz/tesserocr.git",2852.5099537037,21,18,0,26,295,0,0,297,2,"2",1.46153846153846,1.99326599326599,-0.364149040062917,1.41183072401262,1,0,0 +"testfixtures",-1.2559497362,1.6255436778,-1.9966424136,"https://salsa.debian.org/python-team/packages/python-testfixtures","https://github.com/Simplistix/testfixtures",5484.404849537,6,35,0,28,106,0,0,106,4,"4",1.85365853658537,2,1.44622199856559,1.4142135623731,1,0,0 +"python-textile",0.3424022956,1.7744319252,-0.1804144888,"https://salsa.debian.org/python-team/packages/python-textile","https://github.com/textile/python-textile.git",3971.2575578704,0,25,0,16,50,0,0,57,3,"3",2,1.87719298245614,0.405390908255258,1.37010692373119,1,0,0 +"translationstring",-0.284062414,1.4802740524,-0.7286152652,"https://salsa.debian.org/python-team/packages/python-translationstring","https://github.com/Pylons/translationstring.git",3733.753599537,2,15,0,14,26,0,0,27,2,"2",1.88235294117647,1.96296296296296,0.242021813080853,1.40105780143539,1,0,0 +"transliterate",-1.5052976672,1.0843261213,-2.1168561972,"https://salsa.debian.org/python-team/packages/python-transliterate","https://github.com/barseghyanartur/transliterate",3701.1602314815,5,13,0,12,48,0,1,49,2,"2",1.72222222222222,1.97959183673469,0.219602190750018,1.40697968597087,1.02040816326531,0,0 +"tzlocal",0.2105199468,2.3487549308,-0.2866926628,"https://salsa.debian.org/python-team/packages/python-tzlocal","https://github.com/regebro/tzlocal",4104.7635185185,12,22,0,27,150,0,0,150,3,"3",1.64705882352941,2,0.497224106087071,1.4142135623731,1,0,0 +"python-uinput",-0.4895299649,2.0822444703,-1.2154886237,"https://salsa.debian.org/python-team/packages/python-uinput","https://github.com/tuomasjjrasanen/python-uinput",2471.1649768519,3,17,0,9,71,0,0,76,1,"1",1.85,1.93421052631579,-0.626460389544209,1.3907589749183,1,0,0 +"python-unicodecsv",0.2177173313,2.0742154186,-0.2503122986,"https://salsa.debian.org/python-team/packages/python-unicodecsv","https://github.com/jdunck/python-unicodecsv",1788.5991550926,0,17,0,12,93,0,0,93,1,"1",2,2,-1.09596903049602,1.4142135623731,1,0,0 +"uritools",0.5665608671,3.6360712032,-0.2250089468,"https://salsa.debian.org/python-team/packages/python-uritools","https://github.com/tkem/uritools",3490.5498032407,0,3,1,3,16,0,0,16,2,"2",2,2,0.0747320364273954,1.4142135623731,1,0,0 +"venusian",-0.2389886502,1.4708114679,-0.7217668025,"https://salsa.debian.org/python-team/packages/python-venusian","https://github.com/Pylons/venusian",5042.1797800926,6,25,0,24,62,0,0,62,4,"4",1.80645161290323,2,1.14203376538611,1.4142135623731,1,0,0 +"werkzeug",0.6469808555,1.6210316055,0.1636782742,"https://salsa.debian.org/python-team/packages/python-werkzeug","https://github.com/pallets/werkzeug",5778.3072453704,256,251,0,409,438,0,0,737,4,"4",1.49506903353057,1.59430122116689,1.64838523329152,1.2626564145352,1,0,0 +"WebSocket-for-Python",-0.3061877909,1.5232020738,-1.0477652346,"https://salsa.debian.org/python-team/packages/python-ws4py","https://github.com/Lawouach/WebSocket-for-Python.git",4476.5480902778,6,66,0,48,280,0,0,280,3,"3",1.91666666666667,2,0.752959250521414,1.4142135623731,1,1,0 +"xapian-haystack",-1.109004629,0.9965388597,-1.7612034563,"https://salsa.debian.org/python-team/packages/python-xapian-haystack","https://github.com/notanumber/xapian-haystack",5023.7127662037,14,13,1,15,127,0,4,133,4,"4",1.48148148148148,1.95488721804511,1.12933107457299,1.39817281408455,1.03007518796992,0,0 +"pytrainer",-0.1492986337,0.6667449272,-0.6246450089,"https://salsa.debian.org/python-team/packages/pytrainer","https://github.com/pytrainer/pytrainer.git",5724.7457175926,2,26,0,20,59,0,3,64,4,"4",1.92857142857143,1.921875,1.61154248595114,1.38631706330118,1.046875,0,0 +"pytsk",-0.0170924765,1.3661578979,-0.4069676209,"https://salsa.debian.org/pkg-security-team/pytsk","https://github.com/py4n6/pytsk.git",4730.6620833333,5,8,0,6,36,0,2,38,3,"3",1.61538461538462,1.94736842105263,0.927753697771659,1.39548142984872,1.05263157894737,0,0 +"pyuca",-1.879124707,0.4546058772,-2.3447337433,"https://salsa.debian.org/python-team/packages/pyuca","https://github.com/jtauber/pyuca",2863.4539467593,0,6,0,5,24,0,1,26,2,"2",2,1.92307692307692,-0.35662112239942,1.38675049056307,1.03846153846154,1,0 +"pyudev",0.3052041709,1.5797390647,-0.0988792966,"https://salsa.debian.org/python-team/packages/pyudev","https://github.com/pyudev/pyudev",4959.3462037037,7,18,0,18,85,0,1,90,3,"3",1.72,1.94444444444444,1.08505599322739,1.39443337755679,1.01111111111111,0,0 +"pyutilib",-0.2260212517,1.9708399125,-0.6584040073,"https://salsa.debian.org/python-team/packages/pyutilib","https://github.com/pyutilib/pyutilib",3833.6739467593,5,24,4,10,35,0,0,35,3,"3",1.82758620689655,2,0.310752864258976,1.4142135623731,1,1,0 +"pyvirtualdisplay",-0.7443150581,1.4769132038,-1.1764950176,"https://salsa.debian.org/python-team/packages/pyvirtualdisplay","https://github.com/ponty/pyvirtualdisplay.git",4649.3207175926,4,15,0,10,24,0,0,30,3,"3",1.78947368421053,1.8,0.871802355256962,1.34164078649987,1,1,0 +"PyWebDAV3",-0.4415298354,0.1562199484,-0.5984518002,"https://salsa.debian.org/tryton-team/pywebdav","https://github.com/andrewleech/PyWebDAV3.git",5191.6373958333,7,13,0,13,12,0,0,21,4,"4",1.65,1.57142857142857,1.24483944332857,1.25356634105602,1,0,0 +"pywinrm",1.3688605787,4.5307310299,0.2477962041,"https://salsa.debian.org/python-team/packages/python-winrm","https://github.com/diyan/pywinrm.git",3968.3538425926,2,35,0,22,257,0,0,259,3,"3",1.94594594594595,1.99227799227799,0.403393563280854,1.41148077998887,1,1,0 +"pywws",-2.0058814842,0.4297872508,-2.5845945208,"https://salsa.debian.org/debian-iot-team/pywws","https://github.com/jim-easterbrook/pywws",5328.5947916667,7,19,0,21,75,0,0,75,4,"4",1.73076923076923,2,1.33904673987955,1.4142135623731,1,0,0 +"pyx",-0.4214323147,0.0635788825,-0.526071945,"https://salsa.debian.org/debian/pyx3","https://github.com/pyx-project/pyx",5502.6121064815,6,10,0,9,36,0,0,36,4,"4",1.625,2,1.45874601337993,1.4142135623731,1,0,0 +"pyxnat",0.8029079218,3.9217278842,-0.2730026627,"https://salsa.debian.org/med-team/pyxnat","https://github.com/pyxnat/pyxnat.git",4754.1324652778,6,37,0,24,63,0,0,65,3,"3",1.86046511627907,1.96923076923077,0.943897997380713,1.40329283089125,1,1,0 +"pyyaml",0.295656714,0.9675344795,0.0168556096,"https://salsa.debian.org/python-team/packages/pyyaml","https://github.com/yaml/pyyaml.git",5656.1894444445,35,19,0,38,575,0,2,583,4,"4",1.35185185185185,1.98627787307033,1.56438547690032,1.4093537075803,1.00343053173242,1,0 +"qstat",1.4847469863,3.5445875957,0.5684335793,"https://salsa.debian.org/debian/qstat","https://github.com/Unity-Technologies/qstat",4992.716099537,11,11,0,10,43,0,0,43,4,"4",1.5,2,1.10800975672087,1.4142135623731,1,0,0 +"QtPass",-0.2443828761,0.6069592093,-0.421666166,"https://salsa.debian.org/debian/qtpass","https://github.com/IJHack/QtPass",3407.0546643519,102,101,0,112,378,0,0,421,2,"2",1.49753694581281,1.8978622327791,0.0172992029393052,1.37762920729023,1,0,0 +"qtractor",0.2052424785,1.081754113,-0.1776083366,"https://salsa.debian.org/multimedia-team/qtractor","https://github.com/rncbc/qtractor.git",5788.915474537,11,33,0,25,122,0,0,125,4,"4",1.75,1.976,1.65568219294016,1.40570267126445,1,0,0 +"qtspell",-1.1174264874,0.8182545984,-1.5529339,"https://salsa.debian.org/qt-kde-team/extras/qtspell","https://github.com/manisandro/qtspell.git",2705.0642476852,0,4,0,3,14,0,1,15,1,"1",2,1.93333333333333,-0.465570808982572,1.39044357430761,1.06666666666667,1,0 +"quickroute-linux",-0.1342848887,2.9572779507,-1.1039128379,"https://github.com/ralovich/quickroute-linux.git","https://github.com/ralovich/quickroute-linux.git",5000.8862152778,1,8,0,2,9,0,0,9,4,"4",1.88888888888889,2,1.11362963954477,1.4142135623731,1,0,0 +"qxgedit",0.0309448749,2.6946289528,-0.6152383196,"https://salsa.debian.org/multimedia-team/qxgedit","https://github.com/rncbc/qxgedit.git",5219.9988078704,1,11,0,3,3,0,0,3,4,"4",1.91666666666667,2,1.26434807912093,1.4142135623731,1,1,0 +"qxmpp",-0.5119300912,1.2450413293,-0.9220194723,"https://salsa.debian.org/xmpp-team/qxmpp","https://github.com/qxmpp-project/qxmpp.git",5420.5084722222,31,20,0,35,124,0,4,138,4,"4",1.3921568627451,1.89855072463768,1.40227033805395,1.37787906749384,1.02898550724638,1,0 +"AnnotationDbi",0.0182386654,2.4812782442,-0.5700140917,"https://salsa.debian.org/r-pkg-team/r-bioc-annotationdbi","https://github.com/Bioconductor/AnnotationDbi.git",5746.8815509259,1,33,0,12,20,0,0,25,4,"4",1.97058823529412,1.8,1.62676880507428,1.34164078649987,1,0,0 +"BiocParallel",-0.3260931785,0.8473313885,-0.5919329079,"https://salsa.debian.org/r-pkg-team/r-bioc-biocparallel","https://github.com/Bioconductor/BiocParallel",3995.750625,8,26,0,20,99,0,2,102,3,"3",1.76470588235294,1.97058823529412,0.42223867046978,1.40377641926844,1.01960784313725,1,0 +"Biostrings",-0.3434817294,1.1478032448,-0.6149383263,"https://salsa.debian.org/r-pkg-team/r-bioc-biostrings","https://github.com/Bioconductor/Biostrings.git",5738.5090740741,8,24,0,13,81,0,0,84,4,"4",1.75,1.96428571428571,1.6210097264583,1.40152977645347,1,0,0 +"checkmate",0.0859378554,2.3942389138,-0.3501105734,"https://salsa.debian.org/r-pkg-team/r-cran-checkmate","https://github.com/mllg/checkmate.git",3631.5784722222,11,53,0,13,94,0,0,94,2,"2",1.828125,2,0.171739792453154,1.4142135623731,1,1,0 +"crosstalk",0.1167413716,2.2666840084,-0.3491412979,"https://salsa.debian.org/r-pkg-team/r-cran-crosstalk","https://github.com/rstudio/crosstalk.git",2973.0628472222,5,12,0,11,160,0,0,160,2,"2",1.70588235294118,2,-0.281225718392938,1.4142135623731,1,1,0 +"crul",-0.379530865,2.0620312007,-0.8847066541,"https://salsa.debian.org/r-pkg-team/r-cran-crul","https://github.com/ropensci/crul.git",2488.6026967593,12,5,0,14,41,0,0,41,1,"1",1.29411764705882,2,-0.614465707252735,1.4142135623731,1,1,0 +"ggeffects",-0.4101115748,1.6625213011,-0.8467537951,"https://salsa.debian.org/r-pkg-team/r-cran-ggeffects","https://github.com/strengejacke/ggeffects.git",2388.1511805556,6,17,0,11,238,0,0,240,1,"1",1.73913043478261,1.99166666666667,-0.683562127481903,1.41126420866777,1,1,0 +"gnm",-0.0730492729,2.200175057,-0.5474121482,"https://salsa.debian.org/r-pkg-team/r-cran-gnm","https://github.com/hturner/gnm.git",5664.8181712963,2,3,0,4,13,0,0,14,4,"4",1.6,1.92857142857143,1.57032081923388,1.38873014965883,1,1,0 +"gtable",0.3604619903,2.5918478385,-0.180163877,"https://salsa.debian.org/r-pkg-team/r-cran-gtable","https://github.com/r-lib/gtable.git",4252.7226967593,3,15,0,11,32,0,0,32,3,"3",1.83333333333333,2,0.598999071193194,1.4142135623731,1,1,0 +"hms",0.2803130949,2.6915633826,-0.2371947898,"https://salsa.debian.org/r-pkg-team/r-cran-hms","https://github.com/tidyverse/hms",2747.6862152778,3,21,1,13,45,0,0,46,2,"2",1.875,1.97826086956522,-0.436252930118502,1.40650661909755,1,1,0 +"htmlwidgets",0.2223804836,2.4523082161,-0.2245513837,"https://salsa.debian.org/r-pkg-team/r-cran-htmlwidgets","https://github.com/ramnathv/htmlwidgets.git",3428.7835185185,9,25,0,23,280,0,3,283,2,"2",1.73529411764706,1.98939929328622,0.0322455780198876,1.41046066704684,1.01060070671378,1,0 +"httpuv",0.3875945435,2.2228957646,-0.1562790757,"https://salsa.debian.org/r-pkg-team/r-cran-httpuv","https://github.com/rstudio/httpuv.git",3956.9682986111,10,30,0,24,220,0,0,220,3,"3",1.75,2,0.395561921099485,1.4142135623731,1,1,0 +"lmerTestR",-0.2259054579,2.0342017389,-0.6812216469,"https://salsa.debian.org/r-pkg-team/r-cran-lmertest","https://github.com/runehaubo/lmerTestR.git",1009.6075115741,2,4,0,3,48,0,0,48,1,"1",1.66666666666667,2,-1.63180498389682,1.4142135623731,1,1,0 +"memoise",0.1925230273,2.3898049253,-0.2410666252,"https://salsa.debian.org/r-pkg-team/r-cran-memoise","https://github.com/hadley/memoise.git",1189.1777777778,16,15,0,25,125,0,0,126,1,"1",1.48387096774194,1.99206349206349,-1.50828606608264,1.41140479383609,1,1,0 +"openssl",0.1408311251,1.9736821031,-0.3054590509,"https://salsa.debian.org/r-pkg-team/r-cran-openssl","https://github.com/jeroen/openssl.git",3340.7487152778,9,9,0,11,104,0,0,105,2,"2",1.5,1.99047619047619,-0.0283099017717406,1.4108423691101,1,1,0 +"repr",-0.4200486236,1.3653979876,-0.7931488934,"https://salsa.debian.org/r-pkg-team/r-cran-repr","https://github.com/IRkernel/repr.git",3009.4312615741,13,11,0,19,107,0,5,113,2,"2",1.45833333333333,1.94690265486726,-0.256209398718564,1.39531453617715,1.04424778761062,1,0 +"rhandsontable",-0.5116959513,1.6967263903,-0.9527875743,"https://salsa.debian.org/r-pkg-team/r-cran-rhandsontable","https://github.com/jrowen/rhandsontable.git",2472.1080902778,10,16,0,13,398,0,0,399,1,"1",1.61538461538462,1.99749373433584,-0.625811661042515,1.41332718587588,1,1,0 +"svglite",-0.1885587375,2.5890472118,-0.9181907319,"https://salsa.debian.org/r-pkg-team/r-cran-svglite","https://github.com/r-lib/svglite.git",4029.9752546296,5,22,0,17,93,0,0,94,3,"3",1.81481481481481,1.98936170212766,0.445780369793451,1.41044734113956,1,1,0 +"taxize",-0.5524366287,0.9514376137,-0.8175241604,"https://salsa.debian.org/r-pkg-team/r-cran-taxize","https://github.com/ropensci/taxize.git",4557.2839467593,10,50,0,33,204,0,0,205,3,"3",1.83333333333333,1.99512195121951,0.80849408839977,1.41248785878659,1,1,0 +"uwot",-2.1360077927,0.1637273439,-2.6156421022,"https://salsa.debian.org/r-pkg-team/r-cran-uwot","https://github.com/jlmelville/uwot.git",2010.5388078704,2,8,0,7,92,0,0,93,1,"1",1.8,1.98924731182796,-0.943305973795583,1.41040678948591,1,1,0 +"webmockr",-0.4310376105,1.8277386609,-0.9299279762,"https://salsa.debian.org/r-pkg-team/r-cran-webmockr","https://github.com/ropensci/webmockr.git",3289.3273726852,4,4,0,5,17,0,0,18,2,"2",1.5,1.94444444444444,-0.063680504733286,1.39443337755679,1,1,0 +"rabbitvcs",1.6714946058,3.5426783719,0.7068248862,"https://salsa.debian.org/python-team/packages/rabbitvcs","https://github.com/rabbitvcs/rabbitvcs.git",5506.5331481482,17,45,0,47,171,0,0,202,4,"4",1.7258064516129,1.84653465346535,1.46144313486677,1.35887256704422,1,1,0 +"radeontop",0.7905156023,3.9954216105,-0.1328982237,"https://salsa.debian.org/debian/radeontop","https://github.com/clbr/radeontop.git",3881.8500231482,5,20,0,19,110,0,0,114,3,"3",1.8,1.96491228070175,0.343891183569255,1.40175328810092,1,1,0 +"radio_beam",0.0745073319,3.00372116,-0.6555904149,"https://salsa.debian.org/debian-astro-team/radio-beam","https://github.com/radio-astro-tools/radio_beam",3526.8169791667,2,17,0,12,23,0,0,24,2,"2",1.89473684210526,1.95833333333333,0.0996787183990885,1.39940463531222,1,1,0 +"radon",-1.263648812,0.2952439103,-1.5392083653,"https://salsa.debian.org/python-team/packages/radon","https://github.com/rubik/radon.git",4032.6238773148,45,20,0,51,208,0,0,208,3,"3",1.30769230769231,2,0.447602247182679,1.4142135623731,1,0,0 +"radsecproxy",-1.2258402548,0.3482737763,-1.8643939562,"https://salsa.debian.org/debian/radsecproxy","https://github.com/radsecproxy/radsecproxy.git",5771.4660069445,15,23,0,18,53,0,0,57,4,"4",1.60526315789474,1.92982456140351,1.64367942990469,1.38918125577748,1,0,0 +"nqp",0.9566218472,2.1033155845,0.3242094037,"https://salsa.debian.org/perl6-team/rakudo","https://github.com/Raku/nqp.git",5159.1587847222,24,165,0,111,165,0,3,181,4,"4",1.87301587301587,1.91160220994475,1.22249875752706,1.3826070338114,1.01657458563536,0,0 +"rasterio",-0.1071898305,2.015565348,-0.6779665658,"https://salsa.debian.org/debian-gis-team/rasterio","https://github.com/rasterio/rasterio.git",3692.9866550926,96,61,0,141,10,0,13,158,2,"2",1.38853503184713,1.06329113924051,0.213979927490224,1.0311600938945,1.08227848101266,0,0 +"ratt",-0.4370630128,1.1211106019,-0.8710659773,"https://salsa.debian.org/go-team/packages/ratt","https://github.com/Debian/ratt",2545.9663194445,4,6,0,7,15,0,0,15,1,"1",1.6,2,-0.575007656954256,1.4142135623731,1,1,0 +"openrdate",0.4382808092,1.3203416533,0.0177798963,"https://salsa.debian.org/debian/rdate","https://github.com/resurrecting-open-source-projects/openrdate",876.4736111111,0,4,0,3,6,0,0,6,1,"1",2,2,-1.72338225700124,1.4142135623731,1,1,1 +"rdiff-backup",1.0568039762,1.5664048612,0.6904043618,"https://salsa.debian.org/python-team/applications/rdiff-backup","https://github.com/rdiff-backup/rdiff-backup.git",5728.7282407408,45,27,0,46,61,0,0,90,4,"4",1.375,1.67777777777778,1.61428189799209,1.2952906151817,1,0,0 +"redis-py-cluster",-1.8001809263,0.773142511,-2.5308098382,"https://salsa.debian.org/python-team/packages/redis-py-cluster","https://github.com/Grokzen/redis-py-cluster",3217.2146527778,55,25,3,58,325,0,0,330,2,"2",1.3125,1.98484848484848,-0.113283845597607,1.40884650861919,1,1,1 +"r.js",0.307781271,1.8450766211,-0.1061121379,"https://salsa.debian.org/js-team/requirejs","https://github.com/requirejs/r.js.git",4511.8290740741,2,70,0,53,645,0,3,658,3,"3",1.97222222222222,1.98024316109422,0.777227571942708,1.40721112882688,1.00455927051672,0,0 +"ripe.atlas.sagan",-0.8350788458,1.3446746037,-1.3262997043,"https://salsa.debian.org/python-team/packages/ripe-atlas-sagan","https://github.com/RIPE-NCC/ripe.atlas.sagan",2585.8181481482,2,22,0,13,17,0,0,19,1,"1",1.91666666666667,1.89473684210526,-0.547595241422093,1.37649440322337,1,0,0 +"rlwrap",-0.017815457,0.2341200643,-0.1189260094,"https://salsa.debian.org/debian/rlwrap","https://github.com/hanslub42/rlwrap",3317.1894560185,6,18,2,18,111,0,2,113,2,"2",1.75,1.98230088495575,-0.0445153363892475,1.40794207443195,1.01769911504425,1,0 +"rope",1.5978468361,3.9671998177,0.5551935604,"https://salsa.debian.org/python-team/packages/rope","https://github.com/python-rope/rope",5713.8836458333,27,64,1,64,166,0,6,193,4,"4",1.7032967032967,1.860103626943,1.60407091854027,1.36385616065002,1.03108808290155,0,0 +"bond_core",-0.4557919444,0.8030863044,-0.7461613445,"https://salsa.debian.org/science-team/ros-bond-core","https://github.com/ros/bond_core",5161.8582291667,13,47,0,19,71,0,0,72,4,"4",1.78333333333333,1.98611111111111,1.22435559309084,1.40929454377398,1,0,0 +"genmsg",-0.0171725935,2.3757962259,-0.5825726576,"https://salsa.debian.org/science-team/ros-genmsg","https://github.com/ros/genmsg",4008.1554976852,10,28,1,20,69,0,0,71,3,"3",1.73684210526316,1.97183098591549,0.430771466472657,1.40421899499882,1,0,0 +"genpy",-0.6136991201,-0.6108271088,-0.6141657046,"https://salsa.debian.org/science-team/ros-genpy","https://github.com/ros/genpy.git",4178.1003472222,21,31,0,33,89,0,0,91,3,"3",1.59615384615385,1.97802197802198,0.547669460481819,1.40642169281549,1,1,0 +"geometry",-0.5506557748,0.4058218051,-0.730025317,"https://salsa.debian.org/science-team/ros-geometry","https://github.com/ros/geometry",5094.8150694445,26,84,1,57,212,0,0,217,4,"4",1.76363636363636,1.97695852534562,1.17823939183547,1.40604357163838,1,0,0 +"image_common",-0.4587743218,0.0450984941,-0.6096991982,"https://salsa.debian.org/science-team/ros-image-common","https://github.com/ros-perception/image_common.git",5179.6323611111,38,47,0,28,228,0,2,230,4,"4",1.55294117647059,1.99130434782609,1.23658167923122,1.41113583606472,1.00869565217391,0,0 +"interactive_markers",-0.2522280854,2.1257586459,-0.8003900423,"https://salsa.debian.org/science-team/ros-interactive-markers","https://github.com/ros-visualization/interactive_markers.git",5635.5972685185,21,62,0,25,70,0,0,72,4,"4",1.74698795180723,1.97222222222222,1.55022097550712,1.40435829552939,1,0,0 +"kdl_parser",-0.3386572847,2.2780300935,-0.9138488719,"https://salsa.debian.org/science-team/ros-kdl-parser","https://github.com/ros/kdl_parser",4840.7517013889,32,70,0,45,47,0,0,80,3,"3",1.68627450980392,1.5875,1.00347976741717,1.25996031683542,1,1,0 +"laser_geometry",-0.418947578,0.783831601,-0.6760367366,"https://salsa.debian.org/science-team/ros-laser-geometry","https://github.com/ros-perception/laser_geometry",5200.3426388889,9,44,0,21,63,0,0,65,4,"4",1.83018867924528,1.96923076923077,1.25082741797643,1.40329283089125,1,0,0 +"message_runtime",-0.2905975286,1.6300481977,-0.6771923217,"https://salsa.debian.org/science-team/ros-message-runtime","https://github.com/ros/message_runtime.git",2931.9169212963,1,6,0,3,1,0,0,3,2,"2",1.85714285714286,1.33333333333333,-0.309528289582894,1.15470053837925,1,0,0 +"navigation_msgs",-0.585376458,1.338109234,-0.9801897126,"https://salsa.debian.org/science-team/ros-navigation-msgs","https://github.com/ros-planning/navigation_msgs",4055.7909027778,6,14,0,6,18,0,0,20,3,"3",1.7,1.9,0.463537880484671,1.37840487520902,1,1,0 +"nodelet_core",-0.0806493057,2.3062700037,-0.6511678143,"https://salsa.debian.org/science-team/ros-nodelet-core","https://github.com/ros/nodelet_core",4750.0362731482,13,47,1,29,90,0,0,92,3,"3",1.78333333333333,1.97826086956522,0.941080397174935,1.40650661909755,1,0,0 +"pluginlib",-0.6634443823,0.7184010327,-0.9470101264,"https://salsa.debian.org/science-team/ros-pluginlib","https://github.com/ros/pluginlib.git",5189.6688194445,29,44,0,22,130,0,0,131,4,"4",1.6027397260274,1.99236641221374,1.24348534150359,1.4115121013345,1,0,0 +"vision_opencv",-0.5521042677,0.5682460886,-0.8284518786,"https://salsa.debian.org/science-team/ros-vision-opencv","https://github.com/ros-perception/vision_opencv",5223.1408680556,33,82,0,61,435,0,0,437,4,"4",1.71304347826087,1.9954233409611,1.26650937164439,1.41259454230897,1,0,0 +"rss2email",0.3314855505,0.7157681983,0.0455417284,"https://salsa.debian.org/python-team/packages/rss2email","https://github.com/rss2email/rss2email.git",3888.6072916667,25,44,0,51,130,0,0,145,3,"3",1.63768115942029,1.89655172413793,0.348539227549087,1.37715348604937,1,0,0 +"actionpack-xml_parser",-0.2996184364,1.3428057072,-0.5955184752,"https://salsa.debian.org/ruby-team/ruby-actionpack-xml-parser","https://github.com/rails/actionpack-xml_parser",1540.6708333333,2,13,0,9,34,0,0,34,1,"1",1.86666666666667,2,-1.26650861172299,1.4142135623731,1,1,0 +"acts_as_list",-1.8199662912,-1.4681851633,-1.8707866646,"https://salsa.debian.org/ruby-team/ruby-acts-as-list","https://github.com/swanandp/acts_as_list",4913.7026157407,58,72,1,107,411,0,3,423,3,"3",1.55384615384615,1.97163120567376,1.05365966737938,1.40414785748288,1.00709219858156,1,0 +"amqp",-1.8149935347,0.3288060449,-2.3239990954,"https://salsa.debian.org/ruby-team/ruby-amqp","https://github.com/ruby-amqp/amqp.git",4994.8880787037,18,59,0,41,137,0,0,146,4,"4",1.76623376623377,1.93835616438356,1.10950377085728,1.39224860006522,1,1,0 +"api-pagination",-3.3044182875,-0.0567093294,-4.1951110602,"https://salsa.debian.org/ruby-team/ruby-api-pagination","https://github.com/davidcelis/api-pagination.git",3040.7300578704,2,39,0,31,10,0,0,37,2,"2",1.95121951219512,1.27027027027027,-0.234680258459787,1.12706267362125,1,1,1 +"beaneater",-1.3606359648,1.1630055771,-2.0175948675,"https://salsa.debian.org/ruby-team/ruby-beaneater","https://github.com/beanstalkd/beaneater",3900.0326736111,5,29,1,26,71,0,2,73,3,"3",1.85294117647059,1.97260273972603,0.356398272608279,1.40449376635357,1.02739726027397,1,0 +"browser",-0.1660846663,3.3869132145,-1.1464271076,"https://salsa.debian.org/ruby-team/ruby-browser","https://github.com/fnando/browser.git",4214.4159027778,56,56,0,92,148,0,0,210,3,"3",1.5,1.7047619047619,0.57264942078861,1.30566531115823,1,1,0 +"clockwork",-1.6175893707,0.2897910827,-2.1048468681,"https://salsa.debian.org/ruby-team/ruby-clockwork","https://github.com/Rykian/clockwork",4663.0759143519,22,47,0,52,93,0,0,126,3,"3",1.68115942028985,1.73809523809524,0.881263983030585,1.31836839999116,1,1,0 +"coffee-rails",0.3091824065,2.8142114504,-0.2736133929,"https://salsa.debian.org/ruby-team/ruby-coffee-rails","https://github.com/rails/coffee-rails",3619.3450231482,7,34,0,31,141,0,0,142,2,"2",1.82926829268293,1.99295774647887,0.163324911622932,1.41172155415963,1,1,0 +"concurrent-ruby",0.5566030605,2.9441693658,-0.0717542554,"https://salsa.debian.org/ruby-team/ruby-concurrent","https://github.com/ruby-concurrency/concurrent-ruby.git",3789.0811458333,43,132,0,147,281,0,0,329,3,"3",1.75428571428571,1.85410334346505,0.280079331111598,1.36165463443013,1,1,0 +"crack",-0.2561449098,2.087316532,-0.8772440851,"https://salsa.debian.org/ruby-team/ruby-crack","https://github.com/jnunemaker/crack",4290.8581481482,10,28,0,32,97,0,0,104,3,"3",1.73684210526316,1.93269230769231,0.625230862154448,1.39021304399445,1,1,0 +"cri",-0.2343045243,2.3306711919,-0.7929491714,"https://salsa.debian.org/ruby-team/ruby-cri","https://github.com/ddfreyne/cri",5399.7816666667,2,13,0,10,43,0,0,43,4,"4",1.86666666666667,2,1.38801323053785,1.4142135623731,1,0,0 +"curses",0.2397321091,3.7638726076,-0.6627285256,"https://salsa.debian.org/ruby-team/ruby-curses","https://github.com/ruby/curses.git",5368.611724537,1,10,0,23,71,0,0,72,4,"4",1.90909090909091,1.98611111111111,1.36657272370125,1.40929454377398,1,1,0 +"ruby-dbus",-0.5967981722,1.7453526545,-1.2803486489,"https://salsa.debian.org/ruby-team/ruby-dbus","https://github.com/mvidner/ruby-dbus",4746.8070601852,9,33,0,28,89,0,0,93,3,"3",1.78571428571429,1.95698924731183,0.938859155880294,1.39892431793569,1,1,0 +"devise-two-factor",-0.6624262185,1.6467126273,-1.2753154222,"https://salsa.debian.org/ruby-team/ruby-devise-two-factor","https://github.com/tinfoil/devise-two-factor.git",3466.0953935185,20,37,0,43,252,0,0,258,2,"2",1.64912280701754,1.97674418604651,0.0579108650356672,1.40596734885505,1,1,1 +"diffy",-0.2255220294,2.8131844872,-1.0283299527,"https://salsa.debian.org/ruby-team/ruby-diffy","https://github.com/samg/diffy",4494.6685763889,5,31,0,28,132,0,0,132,3,"3",1.86111111111111,2,0.765423579288243,1.4142135623731,1,1,0 +"docker-api",0.2906321596,4.2039401292,-1.0121523475,"https://salsa.debian.org/ruby-team/ruby-docker-api","https://github.com/swipely/docker-api",3249.0699421296,17,99,0,86,233,0,0,256,2,"2",1.85344827586207,1.91015625,-0.0913719169104358,1.3820840242185,1,1,0 +"em-synchrony",-2.0598738156,0.4564215093,-2.9786603575,"https://salsa.debian.org/ruby-team/ruby-em-synchrony","https://github.com/igrigorik/em-synchrony",2910.8221180556,2,57,0,41,186,0,1,190,2,"2",1.96610169491525,1.97894736842105,-0.324038527401657,1.40675064187689,1.00526315789474,1,0 +"factory_girl",-1.4263061364,0.5433633199,-1.9953583847,"https://salsa.debian.org/ruby-team/ruby-factory-girl","https://github.com/thoughtbot/factory_girl.git",4913.9169675926,224,76,0,233,139,0,74,424,3,"3",1.25333333333333,1.32783018867925,1.05380711110343,1.1523151429532,1.17452830188679,1,1 +"fakeredis",-3.9027611166,-1.9110018697,-4.3340476978,"https://salsa.debian.org/ruby-team/ruby-fakeredis","https://github.com/guilleiguaran/fakeredis.git",3981.188900463,20,88,0,77,219,0,0,219,3,"3",1.81481481481481,2,0.412222265781277,1.4142135623731,1,1,0 +"fakeweb",-2.1455045277,-0.7731874586,-2.5667966225,"https://salsa.debian.org/ruby-team/ruby-fakeweb","https://github.com/chrisk/fakeweb.git",3218.6643865741,6,19,0,19,136,0,0,145,2,"2",1.76,1.93793103448276,-0.1122866340134,1.39209591425403,1,0,0 +"faraday_middleware",-0.2690476788,2.0619472224,-0.7696905372,"https://salsa.debian.org/ruby-team/ruby-faraday-middleware","https://github.com/lostisland/faraday_middleware",4563.5818981482,47,29,1,58,244,0,14,260,3,"3",1.38157894736842,1.93846153846154,0.812826187229099,1.39228644267677,1.05384615384615,1,1 +"fast_gettext",-0.1209401725,1.2360688234,-0.5688307825,"https://salsa.debian.org/ruby-team/ruby-fast-gettext","https://github.com/grosser/fast_gettext",5110.3340046296,3,48,0,29,84,0,4,90,4,"4",1.94117647058824,1.93333333333333,1.18891422191852,1.39044357430761,1.04444444444444,0,0 +"fastimage",-0.9259690851,1.7219406128,-1.4847810256,"https://salsa.debian.org/ruby-team/ruby-fastimage","https://github.com/sdsykes/fastimage",5223.7173726852,7,44,0,46,117,0,0,125,4,"4",1.86274509803922,1.936,1.26690592520233,1.39140217047409,1,1,0 +"fog-rackspace",-0.4991371264,1.9082417738,-1.1448163084,"https://salsa.debian.org/ruby-team/ruby-fog-rackspace","https://github.com/fog/fog-rackspace",1479.8924537037,3,5,0,4,40,0,0,40,1,"1",1.625,2,-1.30831553130416,1.4142135623731,1,1,1 +"ruby-fogbugz",-0.712082495,1.9230578337,-1.2759846712,"https://salsa.debian.org/ruby-team/ruby-fogbugz","https://github.com/firmafon/ruby-fogbugz",2091.2249884259,2,11,0,9,16,0,0,16,1,"1",1.84615384615385,2,-0.887805305920706,1.4142135623731,1,1,0 +"font-awesome-rails",-0.8180755531,0.4347325375,-1.0809960447,"https://salsa.debian.org/ruby-team/ruby-font-awesome-rails","https://github.com/bokmann/font-awesome-rails",4227.7840856482,7,30,0,28,346,0,2,349,3,"3",1.81081081081081,1.99140401146132,0.581844837803923,1.41117114889064,1.00573065902579,1,0 +"fssm",-0.4348169171,2.3642288128,-1.1313798455,"https://salsa.debian.org/ruby-team/ruby-fssm","https://github.com/ttilley/fssm.git",2641.9220023148,2,11,0,9,53,0,0,54,1,"1",1.84615384615385,1.98148148148148,-0.509003733493927,1.40765105103555,1,0,0 +"gelf-rb",-2.0473403812,0.3850902599,-2.7168981677,"https://salsa.debian.org/ruby-team/ruby-gelf","https://github.com/Graylog2/gelf-rb",4546.1701157407,9,25,0,21,141,0,0,142,3,"3",1.73529411764706,1.99295774647887,0.800849346265068,1.41172155415963,1,1,1 +"gettext_i18n_rails",-0.7613069529,2.0256293486,-1.5091771924,"https://salsa.debian.org/ruby-team/ruby-gettext-i18n-rails","https://github.com/grosser/gettext_i18n_rails",5235.7802546296,11,59,0,51,141,0,0,144,4,"4",1.84285714285714,1.97916666666667,1.27520347999797,1.40682858467784,1,0,0 +"gettext_i18n_rails_js",-0.9612583287,2.4872560383,-1.8785203213,"https://salsa.debian.org/ruby-team/ruby-gettext-i18n-rails-js","https://github.com/webhippie/gettext_i18n_rails_js",4076.9871759259,2,24,0,18,7,0,0,22,3,"3",1.92307692307692,1.31818181818182,0.478117915232612,1.1481209945741,1,1,0 +"gettext-setup-gem",-0.5280470276,1.250073738,-0.9596386922,"https://salsa.debian.org/puppet-team/ruby-gettext-setup","https://github.com/puppetlabs/gettext-setup-gem",2424.9263310185,17,20,0,23,43,0,0,44,1,"1",1.54054054054054,1.97727272727273,-0.658266030952881,1.40615529984164,1,1,0 +"ruby-gir-ffi",-1.5231800876,0.4754387315,-2.1310553218,"https://salsa.debian.org/ruby-team/ruby-gir-ffi","https://github.com/mvz/ruby-gir-ffi",5437.5734375,3,7,0,7,35,0,4,39,4,"4",1.7,1.8974358974359,1.41400861793855,1.37747446344239,1.1025641025641,1,1 +"guard",-2.9807132483,-1.6178467609,-3.3128126957,"https://salsa.debian.org/ruby-team/ruby-guard","https://github.com/guard/guard.git",4726.434537037,21,191,0,150,537,0,199,776,3,"3",1.90094339622642,1.69201030927835,0.924845744497614,1.30077296607761,1.25644329896907,0,0 +"hipchat-rb",-0.6566424992,1.6469892033,-1.2629040655,"https://salsa.debian.org/ruby-team/ruby-hipchat","https://github.com/hipchat/hipchat-rb",2705.747349537,7,102,0,82,222,0,1,227,1,"1",1.93577981651376,1.97797356828194,-0.465100931628849,1.40640448245942,1.00440528634361,0,0 +"hiredis-rb",-0.8641250548,1.2597163597,-1.3598436427,"https://salsa.debian.org/ruby-team/ruby-hiredis","https://github.com/redis/hiredis-rb.git",4451.3495601852,10,19,0,20,124,0,1,127,3,"3",1.6551724137931,1.97637795275591,0.735626229674771,1.40583710036259,1.00787401574803,1,0 +"http.rb",0.5328919596,3.1587146036,-0.5041412503,"https://salsa.debian.org/ruby-team/ruby-http","https://github.com/httprb/http.rb",4428.9060416667,68,68,2,106,42,0,37,169,3,"3",1.5,1.24852071005917,0.720188266709327,1.11737223433338,1.2189349112426,1,1 +"jquery-rails",0.4762916242,2.5289403929,-0.1671409996,"https://salsa.debian.org/ruby-team/ruby-jquery-rails","https://github.com/rails/jquery-rails.git",4697.0958680556,14,69,0,65,417,0,1,425,3,"3",1.83132530120482,1.98117647058824,0.90466489429728,1.40754270648824,1.00235294117647,1,1 +"jquery-ui-rails",-0.5553100399,1.254748517,-1.1496297544,"https://salsa.debian.org/ruby-team/ruby-jquery-ui-rails","https://github.com/joliss/jquery-ui-rails",4080.9697453704,4,20,0,18,217,0,0,217,3,"3",1.83333333333333,2,0.480857359118865,1.4142135623731,1,1,0 +"js-routes",-3.4644388809,-0.4489124279,-4.2577079397,"https://salsa.debian.org/ruby-team/ruby-js-routes","https://github.com/railsware/js-routes",3471.607662037,19,61,0,62,240,0,0,242,2,"2",1.7625,1.99173553719008,0.0617025252949105,1.41128860875091,1,0,0 +"json_spec",-2.5962462222,0.2357466454,-3.2697648762,"https://salsa.debian.org/ruby-team/ruby-json-spec","https://github.com/collectiveidea/json_spec",2153.749525463,1,19,0,16,121,0,0,122,1,"1",1.95,1.99180327868852,-0.844797277281408,1.41131260842116,1,1,0 +"kaminari",-0.5485185975,1.0463989901,-0.9640266374,"https://salsa.debian.org/ruby-team/ruby-kaminari","https://github.com/kaminari/kaminari",4634.2992476852,35,152,3,153,70,0,47,257,3,"3",1.81283422459893,1.27237354085603,0.86146971084892,1.1279953638451,1.18287937743191,1,1 +"ruby-ldap",0.9723697162,3.8411235557,-0.1487304827,"https://salsa.debian.org/ruby-team/ruby-ldap","https://github.com/bearded/ruby-ldap",3395.5528703704,4,15,0,10,49,0,2,51,2,"2",1.78947368421053,1.96078431372549,0.00938759721776028,1.40028008402801,1.03921568627451,0,0 +"mechanize",-0.3858941786,1.2331276206,-0.8805502233,"https://salsa.debian.org/ruby-team/ruby-mechanize","https://github.com/sparklemotion/mechanize.git",5735.6054513889,5,12,0,103,529,0,6,548,4,"4",1.70588235294118,1.96532846715328,1.6190124451745,1.40190173234549,1.01094890510949,1,0 +"moneta",-0.5640132497,0.2515905482,-0.8103956074,"https://salsa.debian.org/ruby-team/ruby-moneta","https://github.com/moneta-rb/moneta",5182.1595023148,20,32,0,38,98,45,0,155,4,"4",1.61538461538462,1.63225806451613,1.23831999456173,1.27759855373906,1,1,0 +"msgpack-ruby",0.2893496157,2.7505742261,-0.3169362878,"https://salsa.debian.org/ruby-team/ruby-msgpack","https://github.com/msgpack/msgpack-ruby",4471.1247453704,7,115,0,71,168,0,0,198,3,"3",1.94262295081967,1.84848484848485,0.749228757115924,1.35958995601058,1,1,0 +"multi_json",0.6582999616,3.1811345182,-0.0546345167,"https://salsa.debian.org/ruby-team/ruby-multi-json","https://github.com/intridea/multi_json",3679.9527430556,10,44,1,48,209,0,1,218,2,"2",1.81481481481481,1.95871559633028,0.20501444147892,1.39954120922904,1.0045871559633,1,1 +"omniauth-openid",-2.3993574129,-0.1716426742,-2.9778348021,"https://salsa.debian.org/ruby-team/ruby-omniauth-openid","https://github.com/intridea/omniauth-openid",4671.7113888889,3,19,0,14,49,0,0,57,3,"3",1.86363636363636,1.85964912280702,0.887203966816165,1.36368952581114,1,1,0 +"omniauth-saml",-0.5579531725,2.353187853,-1.2497308047,"https://salsa.debian.org/ruby-team/ruby-omniauth-saml","https://github.com/PracticallyGreen/omniauth-saml.git",4118.1158217593,12,46,0,40,204,0,0,207,3,"3",1.79310344827586,1.98550724637681,0.506408600165615,1.40908028386491,1,1,1 +"open4",0.0907349731,2.6591042616,-0.4921712465,"https://salsa.debian.org/ruby-team/ruby-open4","https://github.com/ahoward/open4",1740.4206597222,2,8,0,7,38,0,0,40,1,"1",1.8,1.95,-1.12910901372307,1.39642400437689,1,0,0 +"openid_connect",-1.1502490607,2.0041817142,-2.12720173,"https://salsa.debian.org/ruby-team/ruby-openid-connect","https://github.com/nov/openid_connect",4182.9791435185,0,17,0,9,93,0,3,96,3,"3",2,1.96875,0.551025381545449,1.40312152004023,1.03125,0,0 +"paint",0.0340746752,1.782920882,-0.2850565902,"https://salsa.debian.org/ruby-team/ruby-paint","https://github.com/janlelis/paint.git",4285.910474537,4,14,0,14,30,0,0,31,3,"3",1.77777777777778,1.96774193548387,0.621827563250497,1.40276225194574,1,1,0 +"ruby_parser",-0.2008414789,1.500579567,-0.6200732147,"https://salsa.debian.org/ruby-team/ruby-parser","https://github.com/seattlerb/ruby_parser.git",5671.9061921296,0,3,0,2,215,0,0,216,4,"4",2,1.99537037037037,1.57519637397511,1.4125757927879,1,0,0 +"pathname2",-0.9624861378,1.7646456748,-1.5703348288,"https://salsa.debian.org/ruby-team/ruby-pathname2","https://github.com/djberg96/pathname2",4825.4280902778,0,6,0,1,5,0,1,6,3,"3",2,1.83333333333333,0.99293929264112,1.35400640077266,1.16666666666667,1,0 +"pdf-reader",0.5615735066,2.9676531602,-0.1143510479,"https://salsa.debian.org/ruby-team/ruby-pdf-reader","https://github.com/yob/pdf-reader",5741.4093981482,14,55,0,50,0,0,0,50,4,"4",1.79710144927536,1,1.62300473876472,1,1,1,0 +"posix-spawn",0.1309262243,1.6920070582,-0.2475689059,"https://salsa.debian.org/ruby-team/ruby-posix-spawn","https://github.com/rtomayko/posix-spawn",3425.5233101852,3,31,0,26,114,0,0,116,2,"2",1.91176470588235,1.98275862068966,0.0300030162991116,1.40810461993762,1,1,0 +"rack",0.5237066371,1.7902869998,0.0263794792,"https://salsa.debian.org/ruby-team/ruby-rack","https://github.com/rack/rack",5772.4169444445,210,362,9,391,706,0,76,1026,4,"4",1.63286713286713,1.68810916179337,1.64433354026155,1.29927255100436,1.07407407407407,0,0 +"rack-cors",-0.412726661,2.4616028734,-1.1580055428,"https://salsa.debian.org/ruby-team/ruby-rack-cors","https://github.com/cyu/rack-cors",4892.2220601852,37,39,0,61,338,0,0,361,3,"3",1.51315789473684,1.93628808864266,1.03888408658666,1.39150569120024,1,1,0 +"punycode.js",0.5843909394,4.0464162194,-0.4662308176,"https://salsa.debian.org/ruby-team/ruby-rails-assets-punycode","https://github.com/bestiejs/punycode.js",4371.2037384259,18,3,0,19,151,0,0,151,3,"3",1.14285714285714,2,0.680497252142338,1.4142135623731,1,1,0 +"rails-dom-testing",1.1395257959,2.3186509997,0.452605243,"https://salsa.debian.org/ruby-team/ruby-rails-dom-testing","https://github.com/rails/rails-dom-testing",3596.7865625,8,32,0,32,86,0,0,88,2,"2",1.8,1.97727272727273,0.147807884746897,1.40615529984164,1,1,1 +"rails-html-sanitizer",0.0035830645,1.4381559694,-0.2871912749,"https://salsa.debian.org/ruby-team/ruby-rails-html-sanitizer","https://github.com/rails/rails-html-sanitizer",3530.5188078704,6,25,0,27,142,0,0,143,2,"2",1.80645161290323,1.99300699300699,0.102225052405721,1.41173899606372,1,1,1 +"rbnacl",-0.5101798059,1.8184409822,-1.1442616342,"https://salsa.debian.org/ruby-team/ruby-rbnacl","https://github.com/RubyCrypto/rbnacl",3765.2138425926,11,37,2,39,107,0,6,113,2,"2",1.77083333333333,1.94690265486726,0.263662005850801,1.39531453617715,1.05309734513274,1,0 +"rchardet",0.8898007893,4.3708723994,-0.1239109738,"https://salsa.debian.org/ruby-team/ruby-rchardet","https://github.com/jmhodges/rchardet",5157.8658101852,2,16,0,14,39,0,0,42,4,"4",1.88888888888889,1.92857142857143,1.22160937411772,1.38873014965883,1,0,0 +"rdiscount",0.5400773203,2.7137511021,-0.1397503416,"https://salsa.debian.org/ruby-team/ruby-rdiscount","https://github.com/rtomayko/rdiscount",5495.3965277778,14,23,3,28,170,0,9,190,4,"4",1.62162162162162,1.89473684210526,1.45378271688477,1.37649440322337,1.04736842105263,0,0 +"re2",-0.3975240745,2.0675577643,-1.080838045,"https://salsa.debian.org/ruby-team/ruby-re2","https://github.com/mudge/re2.git",4891.9840277778,5,6,0,6,31,0,1,32,3,"3",1.54545454545455,1.96875,1.03872035399335,1.40312152004023,1.03125,1,0 +"recaptcha",-0.7227524813,1.5115844498,-1.1563133628,"https://salsa.debian.org/ruby-team/ruby-recaptcha","https://github.com/ambethia/recaptcha",5167.5063425926,32,133,0,118,0,0,20,138,4,"4",1.80606060606061,1,1.2282406954121,1,1.14492753623188,0,0 +"redcloth",0.3958422452,2.2802681181,-0.2616585591,"https://salsa.debian.org/ruby-team/ruby-redcloth","https://github.com/jgarber/redcloth.git",5745.4538541667,8,27,0,31,85,0,2,99,4,"4",1.77142857142857,1.85858585858586,1.62578675185137,1.36329962172145,1.02020202020202,0,0 +"redis-actionpack",-0.8365151572,1.4579951576,-1.2916857062,"https://salsa.debian.org/ruby-team/ruby-redis-actionpack","https://github.com/redis-store/redis-actionpack",3755.356412037,8,18,0,15,48,0,0,50,2,"2",1.69230769230769,1.96,0.256881489341041,1.4,1,1,0 +"redis-namespace",-0.5136949026,1.5651978248,-1.007887329,"https://salsa.debian.org/ruby-team/ruby-redis-namespace","https://github.com/resque/redis-namespace",5080.3240046296,46,64,0,90,271,0,0,277,4,"4",1.58181818181818,1.97833935018051,1.16827159103107,1.40653451794846,1,1,0 +"ronn-ng",0.0051973803,1.3529280372,-0.5133229589,"https://salsa.debian.org/ruby-team/ruby-ronn","https://github.com/apjanke/ronn-ng",5091.8833101852,3,20,4,19,40,0,0,50,4,"4",1.8695652173913,1.8,1.17622275657254,1.34164078649987,1,1,0 +"sass-rails",0.1295459675,2.3430805193,-0.2869628621,"https://salsa.debian.org/ruby-team/ruby-sass-rails","https://github.com/rails/sass-rails",3032.8716550926,10,70,2,62,828,0,0,832,2,"2",1.875,1.99519230769231,-0.24008572690054,1.41251276372722,1,1,0 +"seed-fu",-0.3406843156,2.6986297961,-1.1723771613,"https://salsa.debian.org/ruby-team/ruby-seed-fu","https://github.com/mbleigh/seed-fu",3639.382974537,1,34,0,23,185,0,4,196,2,"2",1.97142857142857,1.94387755102041,0.177108185007123,1.39423009256737,1.02040816326531,1,0 +"select2-rails",0.0255233967,4.0170630036,-1.0829307262,"https://salsa.debian.org/ruby-team/ruby-select2-rails","https://github.com/argerim/select2-rails",3178.7430787037,3,45,0,37,323,0,4,328,2,"2",1.9375,1.98475609756098,-0.139746841374705,1.40881371996477,1.01219512195122,1,0 +"signet",-0.6999934393,1.7242691265,-1.2316883956,"https://salsa.debian.org/ruby-team/ruby-signet","https://github.com/googleapis/signet",4807.4255671296,28,44,4,52,165,0,1,167,3,"3",1.61111111111111,1.98802395209581,0.980556105690403,1.4099730324002,1.0059880239521,1,0 +"sinatra",0.3867492716,1.8300987882,-0.1759543833,"https://salsa.debian.org/ruby-team/ruby-sinatra","https://github.com/sinatra/sinatra.git",5774.2084027778,157,401,0,368,41,0,0,396,4,"4",1.71863799283154,1.10353535353535,1.64556580994248,1.05049290979775,1,1,1 +"slack-notifier",-0.2300777475,2.6813920387,-0.9614495819,"https://salsa.debian.org/ruby-team/ruby-slack-notifier","https://github.com/slack-notifier/slack-notifier.git",2800.9713773148,7,25,0,26,174,0,0,175,2,"2",1.78125,1.99428571428571,-0.399600283277197,1.4121918121437,1,0,0 +"solve",-1.8731536972,0.3722546164,-2.3421355548,"https://salsa.debian.org/ruby-team/ruby-solve","https://github.com/berkshelf/solve",3205.9559722222,4,24,0,17,61,0,0,61,2,"2",1.85714285714286,2,-0.121028223704536,1.4142135623731,1,0,0 +"sprockets",0.2127696789,2.1502629674,-0.2372190965,"https://salsa.debian.org/ruby-team/ruby-sprockets","https://github.com/rails/sprockets.git",3278.0454050926,50,229,0,213,572,0,0,665,2,"2",1.82078853046595,1.86015037593985,-0.0714409010244614,1.36387329907871,1,1,1 +"stomp",-0.0622865151,2.2785748082,-0.5399267706,"https://salsa.debian.org/ruby-team/ruby-stomp","https://github.com/stompgem/stomp.git",4485.6743055556,3,49,0,31,92,0,4,103,3,"3",1.94230769230769,1.89320388349515,0.759236794452737,1.37593745624398,1.03883495145631,1,0 +"svg-graph2",-0.3606208872,1.999901842,-1.0364827172,"https://salsa.debian.org/ruby-team/ruby-svg-graph","https://github.com/lumean/svg-graph2",5000.5990393519,3,24,0,20,18,0,1,29,4,"4",1.88888888888889,1.62068965517241,1.11343210316896,1.27306309944653,1.03448275862069,1,0 +"task_list",-0.7972452731,1.5304821718,-1.2730429771,"https://salsa.debian.org/ruby-team/ruby-task-list","https://github.com/deckar01/task_list.git",3500.9144675926,4,16,0,14,10,0,2,22,2,"2",1.8,1.45454545454545,0.0818614579698329,1.20604537831105,1.09090909090909,1,1 +"text",0.3951935457,2.8287836535,-0.1391551665,"https://salsa.debian.org/ruby-team/ruby-text","https://github.com/threedaymonk/text",2533.6334375,0,20,0,9,25,0,0,26,1,"1",2,1.96153846153846,-0.583490933520693,1.40054934277178,1,0,0 +"thread_safe",0.7899153314,3.4062016312,-0.0364056562,"https://salsa.debian.org/ruby-team/ruby-thread-safe","https://github.com/ruby-concurrency/thread_safe",1914.5871759259,2,18,1,17,28,0,0,34,1,"1",1.9,1.82352941176471,-1.00930711079253,1.350381209794,1,1,0 +"toml-rb",-1.0965997307,1.7054562066,-1.7254826934,"https://salsa.debian.org/ruby-team/ruby-toml-rb","https://github.com/emancu/toml-rb.git",3791.6442361111,5,30,0,29,61,0,0,61,3,"3",1.85714285714286,2,0.281842374315058,1.4142135623731,1,1,0 +"ruby-unf_ext",0.5249786091,2.442343707,-0.0572331883,"https://salsa.debian.org/ruby-team/ruby-unf-ext","https://github.com/knu/ruby-unf_ext",4837.9721180556,5,11,0,11,144,0,0,145,3,"3",1.6875,1.99310344827586,1.00156780764475,1.41177315751358,1,1,0 +"validates_url",-1.5783095032,0.6947261226,-2.1729142188,"https://salsa.debian.org/ruby-team/ruby-validate-url","https://github.com/perfectline/validates_url.git",4598.7266782407,25,34,0,47,141,0,0,144,3,"3",1.57627118644068,1.97916666666667,0.837000819787244,1.40682858467784,1,1,0 +"vcr",-1.8354081732,0.3458876474,-2.4299770711,"https://salsa.debian.org/ruby-team/ruby-vcr","https://github.com/vcr/vcr",5026.1477083333,86,97,0,152,774,0,33,823,4,"4",1.53005464480874,1.9404617253949,1.13100596999497,1.39300456761451,1.04009720534629,0,0 +"xpath",0.2253924511,2.6354082514,-0.4532834945,"https://salsa.debian.org/ruby-team/ruby-xpath","https://github.com/teamcapybara/xpath.git",4699.0999421296,4,29,0,22,77,0,0,77,3,"3",1.87878787878788,2,0.906043413503567,1.4142135623731,1,1,0 +"yajl-ruby",0.1342868737,1.2952090225,-0.1984486272,"https://salsa.debian.org/ruby-team/ruby-yajl","https://github.com/brianmario/yajl-ruby",4761.9604282407,20,41,0,45,266,0,0,272,3,"3",1.67213114754098,1.97794117647059,0.949282527538785,1.40639296658885,1,1,0 +"yaml_db",-1.6914754372,0.8448802104,-2.2259427821,"https://salsa.debian.org/ruby-team/ruby-yaml-db","https://github.com/yamldb/yaml_db",4943.5546759259,10,17,0,20,191,0,3,198,3,"3",1.62962962962963,1.96464646464646,1.07419365803692,1.40165846933069,1.01515151515152,1,0 +"yell",-2.2945770851,0.1365084458,-2.7815318187,"https://salsa.debian.org/ruby-team/ruby-yell","https://github.com/rudionrails/yell",3852.7088541667,5,10,0,12,42,0,5,47,3,"3",1.66666666666667,1.8936170212766,0.32384618540485,1.37608757761873,1.1063829787234,1,0 +"rumur",-3.5360734663,-0.8290791088,-4.2689394833,"https://github.com/Smattr/rumur.git","https://github.com/Smattr/rumur.git",3378.9262037037,0,5,0,2,8,0,0,8,2,"2",2,2,-0.00204919528104996,1.4142135623731,1,0,0 +"samizdat",-2.1436226321,0.0590823844,-2.8619607448,"https://salsa.debian.org/ruby-team/samizdat","https://github.com/angdraug/samizdat",3433.2320138889,0,3,0,1,2,0,0,2,2,"2",2,2,0.0353055129727594,1.4142135623731,1,0,0 +"samplv1",0.1318819979,2.3880742784,-0.4301804768,"https://salsa.debian.org/multimedia-team/samplv1","https://github.com/rncbc/samplv1.git",4120.8180671296,1,15,0,6,28,0,3,32,3,"3",1.9375,1.875,0.50826736236976,1.36930639376292,1.09375,0,0 +"sandsifter",-0.8702992262,1.6152724713,-1.5907539971,"https://salsa.debian.org/pkg-security-team/sandsifter","https://github.com/rigred/sandsifter",736.7519907407,4,12,0,7,12,0,0,15,1,"1",1.75,1.8,-1.81949094864743,1.34164078649987,1,1,0 +"sasview",-1.0627164618,0.2502972617,-1.4248935984,"https://salsa.debian.org/science-team/sasview","https://github.com/SasView/sasview.git",5783.1973842593,20,119,0,59,30,0,22,86,4,"4",1.85611510791367,1.34883720930233,1.65174895645286,1.16139451062175,1.25581395348837,0,0 +"scap-workbench",-0.3629110649,2.6509329851,-1.2724650562,"https://salsa.debian.org/debian/scap-workbench","https://github.com/OpenSCAP/scap-workbench.git",4660.2892824074,13,37,0,20,138,0,7,146,3,"3",1.74,1.94520547945205,0.879347174811675,1.39470623410525,1.04794520547945,1,0 +"schismtracker",0.2030503767,1.1666319026,-0.2400483232,"https://salsa.debian.org/multimedia-team/schism","https://github.com/schismtracker/schismtracker",4666.6107291667,15,42,0,31,165,0,6,173,3,"3",1.73684210526316,1.95375722543353,0.883695435129133,1.39776865948322,1.03468208092486,1,0 +"coordgenlibs",-0.6657659236,1.5707387755,-1.125402023,"https://salsa.debian.org/science-team/schroedinger-coordgenlibs","https://github.com/schrodinger/coordgenlibs.git",2268.1054282408,12,9,0,14,28,0,0,29,1,"1",1.42857142857143,1.96551724137931,-0.766136607809803,1.40196905863835,1,1,0 +"scram",0.0112378447,2.4451248274,-0.690432285,"https://salsa.debian.org/science-team/scram","https://github.com/rakhimov/scram.git",1943.5289930556,2,6,0,3,21,0,1,22,1,"1",1.75,1.95454545454545,-0.989399238475958,1.39805059083906,1.04545454545455,0,1 +"scrcpy",-0.0596273247,2.3700526091,-0.5833876176,"https://salsa.debian.org/yangfl-guest/scrcpy","https://github.com/Genymobile/scrcpy",2194.2825462963,140,11,2,121,680,0,13,788,1,"1",1.07284768211921,1.86294416243655,-0.816916298013997,1.364897125221,1.01649746192893,1,0 +"screenFetch",0.8393718554,3.4206935722,0.0064658687,"https://salsa.debian.org/debian/screenfetch","https://github.com/KittyKatt/screenFetch.git",4948.5768518519,38,182,0,141,38,0,5,173,3,"3",1.82727272727273,1.21965317919075,1.07764820398468,1.10437909215575,1.02890173410405,0,0 +"screengrab",0.1432641642,1.1078243645,-0.1380237462,"https://salsa.debian.org/lxqt-team/screengrab","https://github.com/lxqt/screengrab.git",4829.5888194445,59,21,0,54,65,0,0,87,3,"3",1.2625,1.74712643678161,0.995801285190631,1.32178910450253,1,0,0 +"scrot",0.5207763404,1.4883547353,0.0924816727,"https://salsa.debian.org/debian/scrot","https://github.com/resurrecting-open-source-projects/scrot",1711.9000347222,19,22,0,23,60,0,0,64,1,"1",1.53658536585366,1.9375,-1.14872716549096,1.39194109070751,1,1,1 +"scrypt",-0.3160075827,1.9170411595,-0.7532305313,"https://salsa.debian.org/debian/scrypt","https://github.com/Tarsnap/scrypt.git",4121.4724652778,3,11,0,10,45,0,0,46,3,"3",1.78571428571429,1.97826086956522,0.508717495639561,1.40650661909755,1,0,0 +"sdate",-0.1644092081,1.9663758042,-0.7580677936,"https://github.com/df7cb/sdate","https://github.com/df7cb/sdate",5170.3786689815,3,6,0,6,13,0,0,14,4,"4",1.66666666666667,1.92857142857143,1.23021644927529,1.38873014965883,1,1,0 +"seascope",0.1418549141,3.3764775459,-0.9515590832,"https://salsa.debian.org/debian/seascope","https://github.com/anilFree/seascope.git",2921.7499305556,1,15,0,6,6,0,0,7,2,"2",1.9375,1.85714285714286,-0.316521739669411,1.36277028773849,1,0,0 +"selinux",-1.9466562158,0.7511457525,-2.5791957587,"https://salsa.debian.org/selinux-team/secilc","https://github.com/SELinuxProject/selinux.git",5593.8026157407,179,30,0,124,83,0,12,182,4,"4",1.14354066985646,1.45604395604396,1.52147217209622,1.20666646429076,1.06593406593407,0,1 +"THC-Archive",1.9359167993,4.4474577245,0.8251568889,"https://salsa.debian.org/debian/secure-delete","https://github.com/hackerschoice/THC-Archive",1834.166099537,2,3,0,3,7,0,0,8,1,"1",1.6,1.875,-1.06462542453686,1.36930639376292,1,1,0 +"selinux",0.7649754209,3.3984155889,-0.1297129167,"https://salsa.debian.org/selinux-team/selinux-python","https://github.com/SELinuxProject/selinux.git",5593.8026157407,179,30,0,124,83,0,12,182,4,"4",1.14354066985646,1.45604395604396,1.52147217209622,1.20666646429076,1.06593406593407,0,1 +"semi",-0.0012315826,0.7304306594,-0.3636303627,"https://salsa.debian.org/debian/semi","https://github.com/wanderlust/semi",5270.9675347222,3,13,0,9,12,0,0,14,4,"4",1.8125,1.85714285714286,1.29940734653861,1.36277028773849,1,0,0 +"sendemail",0.5149987593,2.580274247,-0.1001009863,"https://github.com/mogaal/sendemail","https://github.com/mogaal/sendemail",1084.8616782407,0,2,0,2,42,0,0,43,1,"1",2,1.97674418604651,-1.58004077245926,1.40596734885505,1,1,0 +"sendxmpp",1.6949802972,3.915419876,0.6723168015,"https://salsa.debian.org/xmpp-team/sendxmpp","https://github.com/lhost/sendxmpp.git",3008.6224768519,2,6,0,3,52,0,0,52,2,"2",1.75,2,-0.256765728091699,1.4142135623731,1,0,0 +"ser2net",0.6438108629,1.9333620158,-0.0355562238,"https://salsa.debian.org/debian/ser2net","https://github.com/cminyard/ser2net",5671.7052083333,14,9,0,15,113,0,0,117,4,"4",1.39130434782609,1.96581196581197,1.57505812558053,1.40207416558896,1,0,0 +"serd",0.7042703147,2.9113947553,0.0669085772,"https://salsa.debian.org/multimedia-team/serd","https://github.com/drobilla/serd.git",4700.7071990741,5,1,0,6,28,0,0,29,3,"3",1.16666666666667,1.96551724137931,0.907148978710051,1.40196905863835,1,0,0 +"serverspec-runner",-1.6557747415,0.9321001072,-2.3818100795,"https://salsa.debian.org/ruby-team/serverspec-runner","https://github.com/hiracy/serverspec-runner",3100.2933101852,2,5,0,2,5,0,0,5,2,"2",1.71428571428571,2,-0.193709174421457,1.4142135623731,1,1,0 +"setBfree",0.0170022664,2.0259314608,-0.4587247273,"https://salsa.debian.org/multimedia-team/setbfree","https://github.com/pantherb/setBfree.git",3675.3818055556,8,6,0,10,61,0,0,61,2,"2",1.42857142857143,2,0.201870283677451,1.4142135623731,1,1,0 +"shapelib",0.2832338511,1.1530187147,-0.0270271594,"https://salsa.debian.org/debian-gis-team/shapelib","https://github.com/OSGeo/shapelib.git",5762.8618865741,4,13,0,16,34,0,0,36,4,"4",1.76470588235294,1.94444444444444,1.6377610133463,1.39443337755679,1,0,1 +"shellinabox",1.4229551917,3.5460511425,0.4536040301,"https://github.com/shellinabox/shellinabox/","https://github.com/shellinabox/shellinabox",3681.1884027778,7,26,0,21,143,0,3,152,2,"2",1.78787878787879,1.94078947368421,0.205864400410871,1.39312220342804,1.01973684210526,1,0 +"shortuuid",-0.4574144902,1.8821725228,-1.1753645345,"https://salsa.debian.org/python-team/packages/shortuuid","https://github.com/skorokithakis/shortuuid.git",4431.3497800926,19,17,0,30,96,0,0,97,3,"3",1.47222222222222,1.98969072164948,0.721869212737695,1.41056397290215,1,1,0 +"shotcut",-0.0371835128,1.3895028111,-0.3956647911,"https://salsa.debian.org/multimedia-team/shotcut","https://github.com/mltframework/shotcut",4437.0470486111,40,29,1,54,300,0,0,337,3,"3",1.42028985507246,1.89020771513353,0.725788126802809,1.3748482516749,1,1,0 +"should.js",-1.54067697,-0.4927936502,-1.7632687804,"https://salsa.debian.org/js-team/should.js","https://github.com/shouldjs/should.js.git",3267.8598842593,8,77,0,66,165,0,6,211,2,"2",1.90588235294118,1.78199052132701,-0.0784470971910128,1.3349121773836,1.02843601895735,0,0 +"simple-obfs",-0.4921488347,2.3362837337,-1.2782165107,"https://salsa.debian.org/bridges-team/simple-obfs","https://github.com/shadowsocks/simple-obfs.git",958.8196412037,21,12,0,23,215,0,0,217,1,"1",1.36363636363636,1.99078341013825,-1.66673984766275,1.41095124300532,1,1,0 +"simple-tpm-pk11",-0.6002403517,1.7339981128,-1.3361738434,"https://salsa.debian.org/debian/simple-tpm-pk11","https://github.com/ThomasHabets/simple-tpm-pk11",3536.4266898148,8,13,0,16,52,0,1,53,2,"2",1.61904761904762,1.9811320754717,0.106288838687122,1.40752693596666,1.0188679245283,1,0 +"simpleburn",1.1321508597,4.0273397461,0.0153846721,"https://github.com/mati75/simpleburn.git","https://github.com/mati75/simpleburn.git",1916.8323611111,0,3,0,2,4,0,0,5,1,"1",2,1.8,-1.00776274128063,1.34164078649987,1,0,0 +"simpleeval",-1.0513943081,0.6565241205,-1.3725768937,"https://salsa.debian.org/tryton-team/simpleeval","https://github.com/danthedeckie/simpleeval.git",3363.307037037,10,23,0,21,94,0,0,95,2,"2",1.6969696969697,1.98947368421053,-0.0127929704316731,1.41048703794488,1,0,0 +"simplejson",0.7781612347,2.530704791,0.1122369737,"https://salsa.debian.org/python-team/packages/simplejson","https://github.com/simplejson/simplejson",5762.0850115741,6,42,0,35,85,0,0,111,4,"4",1.875,1.76576576576577,1.63722663334394,1.3288211940535,1,0,0 +"ssr",0.5074767944,2.5172653323,-0.0714681759,"https://salsa.debian.org/multimedia-team/simplescreenrecorder","https://github.com/MaartenBaert/ssr",3464.0590972222,13,48,0,42,288,0,1,318,2,"2",1.78688524590164,1.90566037735849,0.0565101815027783,1.38045658293135,1.00314465408805,0,0 +"simplesnap",-0.3478600805,2.4893157768,-1.2512484875,"https://github.com/jgoerzen/simplesnap","https://github.com/jgoerzen/simplesnap",3116.7912384259,1,6,0,4,24,0,0,24,2,"2",1.85714285714286,2,-0.182360935731675,1.4142135623731,1,0,0 +"sinntp",-0.7486132539,2.2241911903,-1.864431269,"https://salsa.debian.org/python-team/packages/sinntp","https://github.com/jwilk/sinntp.git",5461.030625,0,2,0,2,3,0,0,4,4,"4",2,1.75,1.43014384163798,1.3228756555323,1,0,0 +"skiboot",-1.2267708754,0.8083409101,-1.8023566904,"https://salsa.debian.org/debian/skiboot","https://github.com/open-power/skiboot.git",3435.5121180556,156,19,0,99,117,0,0,167,2,"2",1.10857142857143,1.70059880239521,0.0368739017997542,1.30407009105922,1,0,1 +"dict",-0.1341965123,0.4940218282,-0.3529875318,"https://salsa.debian.org/debian/skkdic","https://github.com/skk-dev/dict",2069.106724537,1,13,0,14,27,0,0,27,1,"1",1.92857142857143,2,-0.903019539753751,1.4142135623731,1,0,0 +"skktools",-0.7739115557,-0.492281698,-0.8304382583,"https://salsa.debian.org/debian/skktools","https://github.com/skk-dev/skktools",4603.9943402778,1,14,0,9,15,0,0,15,3,"3",1.93333333333333,2,0.840624225421089,1.4142135623731,1,1,0 +"sl",0.323098945,1.3268829075,-0.065447292,"https://salsa.debian.org/debian/sl","https://github.com/mtoyoda/sl",1446.5538657407,0,15,0,10,116,0,0,116,1,"1",2,2,-1.33124775941575,1.4142135623731,1,0,0 +"sleef",-2.2104947128,0.3306322864,-2.7673859805,"https://salsa.debian.org/science-team/sleef","https://github.com/shibatch/sleef.git",2789.4703935185,24,7,0,30,20,0,2,45,2,"2",1.2258064516129,1.44444444444444,-0.407511331706038,1.20185042515466,1.04444444444444,1,0 +"sleuthkit",0.248789794,0.7322070572,0.0073823657,"https://salsa.debian.org/pkg-security-team/sleuthkit","https://github.com/sleuthkit/sleuthkit",5541.6815740741,21,144,0,79,39,0,2,97,4,"4",1.87272727272727,1.4020618556701,1.48562027524208,1.18408692910196,1.02061855670103,1,0 +"slowhttptest",-0.5285418268,1.6541713882,-0.9836957935,"https://salsa.debian.org/debian/slowhttptest","https://github.com/shekyan/slowhttptest",4436.458900463,5,15,0,11,62,0,3,65,3,"3",1.75,1.95384615384615,0.725383564152747,1.39780046996921,1.04615384615385,1,0 +"smarty",0.3504374167,1.5540551587,-0.1505110391,"https://salsa.debian.org/debian/smarty3","https://github.com/smarty-php/smarty.git",3318.9346180556,45,52,0,58,489,0,1,510,2,"2",1.5360824742268,1.95882352941176,-0.0433149120050211,1.39957976886341,1.00196078431373,1,1 +"smbmap",-0.0942111377,1.2729571655,-0.3894550484,"https://salsa.debian.org/pkg-security-team/smbmap","https://github.com/ShawnDEvans/smbmap.git",3137.7212731482,5,16,0,14,95,0,2,99,2,"2",1.76190476190476,1.95959595959596,-0.167964035324015,1.39985569241831,1.02020202020202,1,0 +"smcroute",-0.5495305171,0.137923259,-0.8122481411,"https://salsa.debian.org/debian/smcroute","https://github.com/troglobit/smcroute.git",5055.7766087963,11,24,0,26,82,0,0,90,4,"4",1.68571428571429,1.91111111111111,1.1513864583608,1.38242942355518,1,1,0 +"SmokePing",0.1909583252,0.4951169655,-0.0114998503,"https://salsa.debian.org/debian/smokeping","https://github.com/oetiker/SmokePing.git",5773.8930902778,41,36,0,63,259,0,13,284,4,"4",1.46753246753247,1.91197183098592,1.64534891958754,1.38274069549786,1.04577464788732,1,0 +"snap",-0.2880010482,1.7199246286,-0.9244808984,"https://salsa.debian.org/med-team/snap-aligner","https://github.com/amplab/snap.git",3911.3341898148,1,64,0,10,89,0,0,89,3,"3",1.98461538461538,2,0.364172115576006,1.4142135623731,1,1,0 +"snoopy",1.1669824916,2.8753833581,0.3279585504,"https://salsa.debian.org/pkg-security-team/snoopy","https://github.com/a2o/snoopy",3060.3719097222,6,34,4,21,133,0,0,138,2,"2",1.85,1.96376811594203,-0.221169445473361,1.40134510950801,1,1,0 +"SoapyHackRF",0.1605098081,2.6673565763,-0.324555585,"https://salsa.debian.org/debian-hamradio-team/soapysdr/soapyhackrf","https://github.com/pothosware/SoapyHackRF.git",2556.4767361111,1,9,0,7,36,0,5,41,1,"1",1.9,1.8780487804878,-0.56777797845636,1.37041919881758,1.1219512195122,1,0 +"SoapyOsmo",0.1156871694,2.5406057768,-0.3339209238,"https://salsa.debian.org/debian-hamradio-team/soapysdr/soapyosmo","https://github.com/pothosware/SoapyOsmo.git",2779.5272569445,0,2,0,2,14,0,2,16,2,"2",2,1.875,-0.414350801821351,1.36930639376292,1.125,1,0 +"SoapySDR",0.5757029294,3.2715487378,-0.2009342982,"https://salsa.debian.org/debian-hamradio-team/soapysdr/soapysdr","https://github.com/pothosware/SoapySDR.git",3219.8508912037,4,27,0,26,135,0,20,166,2,"2",1.87096774193548,1.81325301204819,-0.111470486825293,1.34657083439684,1.12048192771084,1,0 +"solarpowerlog",-1.7795970498,0.0950109385,-2.3705182782,"https://github.com/coldtobi/solarpowerlog/tree/debian","https://github.com/coldtobi/solarpowerlog",5143.7188310185,1,8,0,1,1,0,1,3,4,"4",1.88888888888889,1.33333333333333,1.21187825552024,1.15470053837925,1.33333333333333,0,0 +"sombok",0.3006788873,1.8374945588,-0.0607142369,"https://salsa.debian.org/kolter/sombok","https://github.com/hatukanezumi/sombok",1612.4445949074,0,1,0,1,4,0,0,4,1,"1",2,2,-1.21713842619891,1.4142135623731,1,0,0 +"sonata",0.2905505595,0.9576245442,-0.0885666061,"https://salsa.debian.org/mpd-team/sonata","https://github.com/multani/sonata",4950.7015162037,15,21,0,23,50,0,0,60,3,"3",1.58333333333333,1.83333333333333,1.07910967222773,1.35400640077266,1,0,0 +"sonic",0.3436339172,1.4474196373,0.0197565432,"https://salsa.debian.org/a11y-team/sonic","https://github.com/waywardgeek/sonic",4727.1402199074,3,21,0,12,42,0,0,42,3,"3",1.875,2,0.92533115439489,1.4142135623731,1,0,0 +"sope",-0.250285844,0.9987661956,-0.7280518867,"https://salsa.debian.org/debian/sope","https://github.com/inverse-inc/sope.git",4884.8710648148,9,32,0,24,32,0,0,35,3,"3",1.78048780487805,1.91428571428571,1.03382764259844,1.38357714432037,1,0,0 +"soundkonverter",1.0908472726,2.4748241992,0.3743578972,"https://salsa.debian.org/qt-kde-team/extras/soundkonverter","https://github.com/dfaust/soundkonverter.git",4518.0852893519,5,14,0,15,97,0,5,103,3,"3",1.73684210526316,1.94174757281553,0.78153096223701,1.39346602858324,1.04854368932039,0,0 +"spectrwm",0.8740320474,3.3995660037,-0.1106287738,"https://salsa.debian.org/debian/spectrwm","https://github.com/conformal/spectrwm",5428.7537962963,35,24,0,38,333,0,14,353,4,"4",1.40677966101695,1.94334277620397,1.40794195356241,1.39403829796888,1.03966005665722,1,0 +"sphinxcontrib-bibtex",0.111160598,2.1131827213,-0.4197298069,"https://salsa.debian.org/science-team/sphinxcontrib-bibtex","https://github.com/mcmtroffaes/sphinxcontrib-bibtex.git",4544.6493055556,11,9,0,16,150,0,0,150,3,"3",1.45,2,0.799803244189064,1.4142135623731,1,1,0 +"restbuilder",-1.1764165162,1.2846690356,-1.6755940115,"https://salsa.debian.org/python-team/packages/sphinxcontrib-restbuilder","https://github.com/sphinx-contrib/restbuilder.git",2987.8306828704,1,10,0,8,23,0,0,25,2,"2",1.90909090909091,1.92,-0.27106753844318,1.3856406460551,1,1,0 +"spelling",-0.7874116783,1.0287481645,-1.4199296239,"https://salsa.debian.org/python-team/packages/sphinxcontrib-spelling","https://github.com/sphinx-contrib/spelling",5270.8333333333,12,76,0,67,83,0,0,120,4,"4",1.86363636363636,1.69166666666667,1.29931503498461,1.30064086767511,1,0,0 +"sphinxcontrib-websupport",-1.489015386,0.092912366,-1.8959476069,"https://salsa.debian.org/python-team/packages/sphinxcontrib-websupport","https://github.com/sphinx-doc/sphinxcontrib-websupport",4818.6938425926,8,17,0,18,21,0,0,29,3,"3",1.68,1.72413793103448,0.988307083735081,1.31306432859723,1,0,0 +"sphinxtesters",-1.0316070726,1.4478444724,-1.604600739,"https://salsa.debian.org/python-team/packages/sphinxtesters","https://github.com/matthew-brett/sphinxtesters.git",2155.7952314815,0,3,0,2,5,0,0,5,1,"1",2,2,-0.843390121191966,1.4142135623731,1,0,0 +"spin-debian",-0.5307239904,2.5263569152,-1.4016281412,"https://github.com/thomaslee/spin-debian","https://github.com/thomaslee/spin-debian",1934.3454282407,2,4,0,2,3,0,0,3,1,"1",1.66666666666667,2,-0.995716230768692,1.4142135623731,1,0,0 +"sqldeveloper-package",0.3178462622,2.5512521122,-0.5498064554,"https://github.com/lazarusllong/sqldeveloper-package.git","https://github.com/lazarusllong/sqldeveloper-package.git",2130.3049189815,0,3,0,1,6,0,0,6,1,"1",2,2,-0.860923847021462,1.4142135623731,1,0,0 +"sqlgrey-debian",-0.447394697,1.287594037,-1.0928861268,"https://github.com/bobek/sqlgrey-debian","https://github.com/bobek/sqlgrey-debian",4172.3835300926,1,3,0,2,1,0,0,2,3,"3",1.75,1.5,0.543737099740154,1.22474487139159,1,0,0 +"sqlmap",-0.0436656036,1.2298763794,-0.4076774194,"https://salsa.debian.org/pkg-security-team/sqlmap","https://github.com/sqlmapproject/sqlmap.git",5537.8440625,75,67,0,118,120,0,6,236,4,"4",1.47183098591549,1.50847457627119,1.48298061063193,1.22819972979609,1.02542372881356,0,0 +"ssh-audit",0.2128051096,2.7100037355,-0.3787946632,"https://salsa.debian.org/debian/ssh-audit","https://github.com/jtesta/ssh-audit.git",2897.0719328704,19,7,0,23,122,0,13,141,2,"2",1.26923076923077,1.86524822695035,-0.333496707921888,1.36574090769456,1.09219858156028,1,1 +"sshuttle",0.4686212873,1.5902040128,-0.0562158764,"https://salsa.debian.org/debian/sshuttle","https://github.com/sshuttle/sshuttle.git",4975.0844675926,104,46,0,119,319,0,1,380,3,"3",1.30666666666667,1.83947368421053,1.09588169040393,1.356271980176,1.00263157894737,0,0 +"sslsplit",0.0482855639,2.1228996274,-0.6371278291,"https://salsa.debian.org/debian/sslsplit","https://github.com/droe/sslsplit",4093.9351851852,9,20,2,17,164,0,0,170,3,"3",1.68965517241379,1.96470588235294,0.48977574593627,1.40167966467126,1,1,0 +"subliminal",0.7190070506,3.1421902787,-0.2079240806,"https://salsa.debian.org/python-team/packages/subliminal","https://github.com/Diaoul/subliminal.git",3790.6726273148,11,36,0,30,562,0,0,566,3,"3",1.76595744680851,1.99293286219081,0.281174045033184,1.41171274067737,1,0,1 +"suds",-0.2061376952,0.1335002243,-0.2803381261,"https://salsa.debian.org/python-team/packages/suds","https://github.com/suds-community/suds.git",3431.6421990741,14,23,0,26,80,0,0,87,2,"2",1.62162162162162,1.91954022988506,0.0342119454818794,1.38547473087208,1,1,0 +"sundials",0.1304834937,1.329515137,-0.4214324267,"https://salsa.debian.org/science-team/sundials","https://github.com/LLNL/sundials.git",5750.416412037,17,59,0,19,126,0,1,131,4,"4",1.77631578947368,1.9618320610687,1.62920028901812,1.40065415469655,1.00763358778626,0,1 +"svgpp",-1.8854559409,-0.5385173138,-2.2188275477,"https://salsa.debian.org/debian/svgpp","https://github.com/svgpp/svgpp.git",3480.6248726852,6,8,0,8,55,0,1,56,2,"2",1.57142857142857,1.98214285714286,0.067905089475022,1.40788595317336,1.01785714285714,1,0 +"svgwrite",0.1630015143,2.8978314663,-0.6431657526,"https://salsa.debian.org/python-team/packages/svgwrite","https://github.com/mozman/svgwrite.git",2562.4058912037,4,22,0,19,110,0,0,115,1,"1",1.84615384615385,1.95652173913043,-0.563699559261059,1.39875721236047,1,0,0 +"svn2git",0.0735704043,2.214779927,-0.6989156967,"https://salsa.debian.org/debian/svn-all-fast-export","https://github.com/svn-all-fast-export/svn2git.git",5311.2481365741,28,29,0,32,96,0,0,107,4,"4",1.50877192982456,1.89719626168224,1.3271146972868,1.37738747695855,1,1,0 +"svtplay-dl",-0.259583484,1.4909319758,-0.7330050577,"https://salsa.debian.org/olof/svtplay-dl","https://github.com/spaam/svtplay-dl",4669.1490162037,48,26,3,52,53,0,0,92,3,"3",1.35135135135135,1.57608695652174,0.88544141721481,1.25542301895486,1,1,0 +"swaks",-0.0249524642,0.3218579009,-0.1486439733,"https://salsa.debian.org/debian/swaks","https://github.com/jetmore/swaks",5448.0600694445,0,9,5,5,49,0,0,49,4,"4",2,2,1.42122193591531,1.4142135623731,1,0,0 +"swami",0.1476526288,1.5183148814,-0.4624982263,"https://salsa.debian.org/multimedia-team/swami","https://github.com/swami/swami",4547.4787962963,6,10,0,8,16,0,0,19,3,"3",1.625,1.84210526315789,0.801749533191387,1.35724178507659,1,0,0 +"swauth",-2.4254901848,-0.8570793139,-2.7795442667,"https://salsa.debian.org/openstack-team/services/swauth","https://github.com/openstack/swauth.git",3045.1673958333,5,41,0,20,0,0,0,20,2,"2",1.89130434782609,1,-0.231627998223499,1,1,1,0 +"swayidle",-0.101420118,2.2036420089,-0.6198513899,"https://salsa.debian.org/swaywm-team/swayidle","https://github.com/swaywm/swayidle",1867.500775463,24,22,0,36,149,0,0,156,1,"1",1.47826086956522,1.9551282051282,-1.04169588735282,1.3982589907196,1,1,0 +"swift",-0.7448605494,-0.5081147887,-0.8497485173,"https://salsa.debian.org/openstack-team/services/swift","https://github.com/openstack/swift.git",4902.7891898148,50,447,0,293,35,0,0,321,3,"3",1.89939637826962,1.10903426791277,1.04615277557312,1.05310695938863,1,0,0 +"synaptic",4.0786320856,4.6212205168,3.6414737103,"https://github.com/mvo5/synaptic","https://github.com/mvo5/synaptic",5665.1249768519,20,60,0,45,96,0,2,108,4,"4",1.75,1.88888888888889,1.57053185801557,1.37436854187255,1.01851851851852,1,0 +"tappy",-0.7057840569,2.2385171659,-1.5015511284,"https://salsa.debian.org/python-team/packages/tap.py","https://github.com/python-tap/tappy",3537.627025463,10,7,0,13,34,0,0,34,2,"2",1.41176470588235,2,0.107114499657693,1.4142135623731,1,1,0 +"tcpflow",0.1993321539,0.7688453693,-0.0915379508,"https://salsa.debian.org/debian/tcpflow","https://github.com/simsong/tcpflow.git",4133.2346875,26,36,0,41,169,0,0,171,3,"3",1.58064516129032,1.98830409356725,0.516808239116702,1.41007237174808,1,1,0 +"tcpslice",0.3358455905,2.6360959654,-0.570915695,"https://salsa.debian.org/debian/tcpslice","https://github.com/the-tcpdump-group/tcpslice",1218.7178356482,4,7,0,9,17,0,0,18,1,"1",1.63636363636364,1.94444444444444,-1.4879666888413,1.39443337755679,1,1,0 +"tdc",-0.5860347644,1.7220497679,-1.1918576951,"https://github.com/MTecknology/tdc","https://github.com/MTecknology/tdc",2078.2080208333,1,4,0,1,3,0,0,3,1,"1",1.8,2,-0.896759136553425,1.4142135623731,1,0,0 +"tdiary-contrib",-1.4993548568,-0.3330069572,-2.0474169755,"https://salsa.debian.org/ruby-team/tdiary-contrib","https://github.com/tdiary/tdiary-contrib",5617.5064699074,4,81,0,39,47,0,0,49,4,"4",1.95294117647059,1.95918367346939,1.53777706753684,1.39970842444753,1,0,0 +"tdiary-style-gfm",-3.85195761,-1.6209873018,-4.3352117054,"https://salsa.debian.org/ruby-team/tdiary-style-gfm","https://github.com/tdiary/tdiary-style-gfm",3042.2103356482,2,13,0,10,14,0,0,14,2,"2",1.86666666666667,2,-0.233662036941026,1.4142135623731,1,1,0 +"tea-qt",-0.2810310835,0.1682947168,-0.470037759,"https://salsa.debian.org/debian/tea","https://github.com/psemiletov/tea-qt.git",2860.1480092593,4,9,0,7,18,0,1,21,2,"2",1.69230769230769,1.85714285714286,-0.358895139312098,1.36277028773849,1.04761904761905,1,0 +"teckit",2.1261637138,6.076788803,0.7450555927,"https://github.com/debian-tex/teckit","https://github.com/debian-tex/teckit",2563.6115277778,1,6,0,2,1,0,0,3,1,"1",1.85714285714286,1.33333333333333,-0.562870252004026,1.15470053837925,1,0,0 +"tegaki",1.3618120507,5.4067459557,0.1410792866,"https://salsa.debian.org/debian/tegaki-zinnia-japanese","https://github.com/tegaki/tegaki.git",5118.3927777778,1,17,0,7,18,0,0,21,4,"4",1.94444444444444,1.85714285714286,1.19445751680369,1.36277028773849,1,0,0 +"terminado",0.1170410576,1.292034871,-0.1639482973,"https://salsa.debian.org/python-team/packages/terminado","https://github.com/jupyter/terminado",3771.3957407407,25,31,0,38,96,0,0,101,3,"3",1.55357142857143,1.95049504950495,0.267914276482424,1.39660124928519,1,1,0 +"termshark",-0.7902341917,1.4608630566,-1.2282898458,"https://salsa.debian.org/go-team/packages/termshark","https://github.com/gcla/termshark.git",1476.2094328704,6,14,0,14,67,0,0,72,1,"1",1.7,1.93055555555556,-1.31084892815896,1.38944433337776,1,1,0 +"tifffile",-0.4950191398,1.0954022518,-0.9432954038,"https://salsa.debian.org/python-team/packages/tifffile","https://github.com/cgohlke/tifffile.git",1876.5951851852,0,2,0,1,107,0,0,107,1,"1",2,2,-1.0354402211404,1.4142135623731,1,0,0 +"tigervnc",0.3860499518,0.9771386342,0.0684855341,"https://salsa.debian.org/debian-remote-team/tigervnc","https://github.com/TigerVNC/tigervnc.git",5713.2161226852,57,92,0,111,563,0,20,660,4,"4",1.61744966442953,1.8530303030303,1.60361175712891,1.36126055662768,1.03030303030303,0,0 +"tikzit",-0.3160832668,1.7178404043,-0.77589652,"https://salsa.debian.org/debian/tikzit","https://github.com/tikzit/tikzit.git",4273.8409027778,1,14,0,8,114,0,0,115,3,"3",1.93333333333333,1.99130434782609,0.613525406809487,1.41113583606472,1,1,0 +"tiledarray",-1.7374267908,0.1767686338,-2.351826242,"https://salsa.debian.org/debichem-team/tiledarray","https://github.com/ValeevGroup/tiledarray.git",5618.1119675926,7,39,0,21,38,0,5,43,4,"4",1.84782608695652,1.88372093023256,1.53819356421191,1.37248713299344,1.11627906976744,1,0 +"tktable",0.3811226337,2.9724908262,-0.2247277525,"https://salsa.debian.org/tcltk-team/tk-table","https://github.com/wjoye/tktable",2301.1677546296,2,6,0,3,5,0,0,5,1,"1",1.75,2,-0.743394408545415,1.4142135623731,1,1,0 +"python-tldp",-2.9387752686,-1.0847198188,-3.3226946918,"https://github.com/tLDP/python-tldp","https://github.com/tLDP/python-tldp",2447.0141319445,0,4,0,2,4,0,0,4,1,"1",2,2,-0.643072751325063,1.4142135623731,1,0,0 +"tldr.py",-0.8494191178,1.5859020327,-1.3735854961,"https://salsa.debian.org/python-team/packages/tldr-py","https://github.com/lord63/tldr.py",1740.1593055556,4,6,0,6,33,0,0,33,1,"1",1.6,2,-1.12928878838458,1.4142135623731,1,0,0 +"tlf",-0.8747316419,-0.5145883819,-0.9886468624,"https://salsa.debian.org/debian-hamradio-team/tlf","https://github.com/Tlf/tlf.git",5111.2798263889,15,21,0,19,45,0,2,47,4,"4",1.58333333333333,1.95744680851064,1.18956481337012,1.39908784874669,1.04255319148936,1,0 +"tootle",1.2711208148,4.7692261317,-0.0231156554,"https://salsa.debian.org/debian/tootle","https://github.com/bleakgrey/tootle.git",1706.1450925926,21,13,0,23,214,0,0,214,1,"1",1.38235294117647,2,-1.15268575083451,1.4142135623731,1,1,0 +"torbrowser-launcher",0.2254493944,0.4690081374,0.0615930109,"https://salsa.debian.org/pkg-privacy-team/torbrowser-launcher","https://github.com/micahflee/torbrowser-launcher",3941.4624421296,20,66,6,66,20,0,1,80,3,"3",1.76744186046512,1.25,0.384896087312703,1.11803398874989,1.0125,1,0 +"totalopenstation",-0.3889221766,1.015672648,-0.7332210243,"https://salsa.debian.org/debian-gis-team/totalopenstation","https://github.com/totalopenstation/totalopenstation.git",3856.5791319445,6,8,0,10,14,0,0,20,3,"3",1.57142857142857,1.7,0.326508388523777,1.30384048104053,1,0,1 +"traitlets",0.2529500243,1.8629238208,-0.0962338622,"https://salsa.debian.org/python-team/packages/traitlets","https://github.com/ipython/traitlets.git",5659.0350347222,36,89,0,97,252,0,0,265,4,"4",1.712,1.95094339622642,1.56634284010456,1.39676175356659,1,1,1 +"twolame",0.8417112782,2.6067569755,0.181912311,"https://salsa.debian.org/multimedia-team/twolame","https://github.com/njh/twolame",5003.7664467593,10,10,2,13,33,0,0,33,4,"4",1.5,2,1.11561083099239,1.4142135623731,1,1,0 +"txt2html",0.7774259234,2.1221283602,0.106308761,"https://salsa.debian.org/debian/txt2html","https://github.com/resurrecting-open-source-projects/txt2html",5316.6490856482,1,4,0,2,4,0,0,4,4,"4",1.8,2,1.33082978553,1.4142135623731,1,0,1 +"txt2man",0.4090645621,1.519569464,-0.1442456476,"https://salsa.debian.org/debian/txt2man","https://github.com/mvertes/txt2man",2424.6791435185,2,9,0,9,19,0,0,19,1,"1",1.81818181818182,2,-0.658436060953631,1.4142135623731,1,0,0 +"txt2tags",0.0507302842,1.0615675266,-0.3853719858,"https://salsa.debian.org/python-team/packages/txt2tags","https://github.com/txt2tags/txt2tags.git",5549.6046296296,9,22,0,3,36,0,1,37,4,"4",1.70967741935484,1.97297297297297,1.49107021563971,1.40462556326338,1.02702702702703,1,0 +"txWS",-1.4288081047,1.2079142338,-2.0336181053,"https://salsa.debian.org/python-team/packages/txws","https://github.com/MostAwesomeDude/txWS",4288.2085763889,2,10,0,9,37,0,0,37,3,"3",1.83333333333333,2,0.623408331936619,1.4142135623731,1,0,0 +"txZMQ",-0.6021876626,0.9002822086,-1.0188293115,"https://salsa.debian.org/python-team/packages/txzmq","https://github.com/smira/txZMQ",3989.2474074074,3,25,0,17,61,0,0,62,3,"3",1.89285714285714,1.98387096774194,0.417765377555924,1.40849954481424,1,0,0 +"typogrify",-0.5841407904,1.9099456866,-1.1786502144,"https://salsa.debian.org/python-team/packages/typogrify","https://github.com/mintchaos/typogrify",4964.5992708333,2,13,0,12,50,0,0,50,3,"3",1.86666666666667,2,1.08866935963137,1.4142135623731,1,0,0 +"u-msgpack-python",0.71036009,3.6137824666,-0.1082167429,"https://salsa.debian.org/python-team/packages/u-msgpack-python","https://github.com/vsergeev/u-msgpack-python",3518.0095949074,11,3,1,10,40,0,0,40,2,"2",1.21428571428571,2,0.093620485065245,1.4142135623731,1,1,0 +"uap-core",-1.4950577768,0.2195779264,-1.9007872982,"https://salsa.debian.org/debian/uap-core","https://github.com/ua-parser/uap-core.git",3378.7186458333,35,224,0,172,383,0,0,428,2,"2",1.86486486486486,1.89485981308411,-0.00219196570778961,1.37653907067112,1,1,1 +"udisks",1.637930268,2.6755087394,1.0040393895,"https://salsa.debian.org/utopia-team/udisks2","https://github.com/storaged-project/udisks",5742.1701388889,64,76,1,109,96,0,1,178,4,"4",1.54285714285714,1.53932584269663,1.62352802068113,1.24069570914734,1.00561797752809,1,0 +"ufo2otf-debian",-1.1799643582,1.8587549116,-1.9214944844,"https://github.com/Rudloff/ufo2otf-debian","https://github.com/Rudloff/ufo2otf-debian",893.8441666667,1,3,0,3,1,0,0,3,1,"1",1.75,1.33333333333333,-1.71143377427401,1.15470053837925,1,0,0 +"UglifyJS2",-0.4631278916,1.3138425047,-0.9110194583,"https://salsa.debian.org/js-team/uglifyjs","https://github.com/mishoo/UglifyJS2",3886.0955208333,82,71,0,115,88,0,0,192,3,"3",1.4640522875817,1.45833333333333,0.34681148485706,1.20761472884912,1,1,1 +"UglifyJS2",1.1390181603,3.3421341091,0.221625202,"https://salsa.debian.org/js-team/uglifyjs","https://github.com/mishoo/UglifyJS2",3886.0955208333,82,71,0,115,88,0,0,192,3,"3",1.4640522875817,1.45833333333333,0.34681148485706,1.20761472884912,1,1,1 +"ukui-sidebar",-3.8890227903,-1.5419346693,-4.3399549698,"https://github.com/ukui/ukui-sidebar","https://github.com/ukui/ukui-sidebar",770.8421412037,16,52,0,28,0,0,0,28,1,"1",1.76470588235294,1,-1.79604175194949,1,1,1,0 +"unshield",1.079201816,2.9040511207,0.2466958012,"https://salsa.debian.org/games-team/unshield","https://github.com/twogood/unshield.git",5774.0918055556,2,32,0,28,33,0,0,49,4,"4",1.94117647058824,1.6734693877551,1.64548560756259,1.29362644830535,1,1,0 +"Unworkable",-0.495607915,1.1078529483,-1.0387863531,"https://salsa.debian.org/debian/unworkable","https://github.com/niallo/Unworkable.git",3168.162650463,2,5,0,2,2,0,0,3,2,"2",1.71428571428571,1.66666666666667,-0.147024677922652,1.29099444873581,1,0,0 +"usbauth-all",-0.84864584,2.3248338051,-1.5774396132,"https://salsa.debian.org/debian/usbauth","https://github.com/kochstefan/usbauth-all.git",2917.2837384259,3,5,0,2,7,0,0,7,2,"2",1.625,2,-0.319593847486999,1.4142135623731,1,0,0 +"usbauth-all",-1.3618380248,0.1189121883,-1.684268531,"https://salsa.debian.org/debian/usbauth-notifier","https://github.com/kochstefan/usbauth-all.git",2917.2837384259,3,5,0,2,7,0,0,7,2,"2",1.625,2,-0.319593847486999,1.4142135623731,1,0,0 +"usbguard",-0.21450453,0.5691395227,-0.5636553493,"https://salsa.debian.org/birger/usbguard","https://github.com/dkopecek/usbguard",3141.3933796296,33,38,1,43,150,0,1,161,2,"2",1.53521126760563,1.93167701863354,-0.165438145997959,1.38984784010105,1.00621118012422,0,0 +"usbmuxd",1.7018106669,3.399620343,0.8385492974,"https://salsa.debian.org/imobiledevice-team/usbmuxd","https://github.com/libimobiledevice/usbmuxd",5280.2443287037,27,16,0,24,138,0,1,149,4,"4",1.37209302325581,1.9261744966443,1.30578846729766,1.38786688722092,1.00671140939597,1,0 +"usbview",0.2830288966,1.2165170826,-0.0945146744,"https://salsa.debian.org/debian/usbview","https://github.com/gregkh/usbview.git",5596.9732407408,7,11,0,12,12,0,0,21,4,"4",1.61111111111111,1.57142857142857,1.52365311316785,1.25356634105602,1,0,0 +"uvloop",-0.4097803455,1.6193553491,-1.0751849943,"https://salsa.debian.org/python-team/packages/uvloop","https://github.com/MagicStack/uvloop",2912.1617939815,58,10,0,57,542,0,1,543,2,"2",1.14705882352941,1.99815837937385,-0.323117020049203,1.4135623012,1.00184162062615,0,0 +"v4l2loopback",-0.1197314674,0.4069152495,-0.2587985427,"https://salsa.debian.org/debian/v4l2loopback","https://github.com/umlaeute/v4l2loopback.git",5406.2159953704,26,63,0,57,94,0,35,176,4,"4",1.70786516853933,1.53409090909091,1.39243913765011,1.23858423576716,1.19886363636364,1,0 +"vagrant-libvirt",-0.1221442454,0.3185253091,-0.2416538921,"https://salsa.debian.org/ruby-team/vagrant-libvirt","https://github.com/vagrant-libvirt/vagrant-libvirt",3827.3451388889,87,210,0,209,98,0,3,280,3,"3",1.70707070707071,1.35,0.306399540539341,1.16189500386223,1.01071428571429,1,0 +"vagrant-lxc",0.8034556285,4.6021026989,-0.412211374,"https://salsa.debian.org/ruby-team/vagrant-lxc","https://github.com/fgrehm/vagrant-lxc",3559.775474537,9,55,2,46,129,0,31,186,2,"2",1.859375,1.69354838709677,0.122349496624171,1.30136404864157,1.16666666666667,1,1 +"vagrant-mutate",-0.4801401485,1.7149444538,-0.9074989115,"https://salsa.debian.org/ruby-team/vagrant-mutate","https://github.com/sciurus/vagrant-mutate",1407.9479166667,3,15,4,15,61,0,1,62,1,"1",1.83333333333333,1.98387096774194,-1.35780318616664,1.40849954481424,1.01612903225806,1,0 +"vagrant-sshfs",-0.3177714786,2.0839099019,-0.8418425788,"https://salsa.debian.org/ruby-team/vagrant-sshfs","https://github.com/dustymabe/vagrant-sshfs",2305.1928472222,2,14,0,15,132,0,0,132,1,"1",1.875,2,-0.740625714754117,1.4142135623731,1,0,0 +"vcsh",1.141131609,4.2673996711,0.0261319499,"https://github.com/RichiH/vcsh","https://github.com/RichiH/vcsh",4529.0101851852,11,57,0,53,153,63,2,223,3,"3",1.83823529411765,1.68609865470852,0.789045743715538,1.29849861559746,1.00896860986547,1,0 +"VOoM",-0.4785805602,0.6126802722,-0.659254773,"https://salsa.debian.org/yyabuki/vim-voom","https://github.com/vim-voom/VOoM.git",1193.9262731482,0,1,0,1,20,0,0,20,1,"1",2,2,-1.50501977360673,1.4142135623731,1,0,0 +"virtualjaguar-debian",-0.3323824959,1.6186130413,-0.7674058951,"https://github.com/glaubitz/virtualjaguar-debian","https://github.com/glaubitz/virtualjaguar-debian",1293.0757291667,2,1,0,1,1,0,0,2,1,"1",1.33333333333333,1.5,-1.43681898642642,1.22474487139159,1,0,0 +"vmtouch",0.0085288392,3.0675234726,-0.8067347383,"https://salsa.debian.org/debian/vmtouch","https://github.com/hoytech/vmtouch",4266.5434837963,8,25,0,21,85,0,0,86,3,"3",1.75757575757576,1.98837209302326,0.608505815790955,1.41009648358659,1,1,0 +"voctomix",-0.3727468412,1.1810950571,-0.6494603735,"https://salsa.debian.org/debian/voctomix","https://github.com/voc/voctomix.git",3329.1224189815,7,54,0,35,80,0,5,86,2,"2",1.88524590163934,1.93023255813953,-0.036307147457599,1.38932809592966,1.05813953488372,1,0 +"voctomix-outcasts",-1.6893130475,-1.2420509413,-1.7699634447,"https://salsa.debian.org/debian/voctomix-outcasts","https://github.com/CarlFK/voctomix-outcasts.git",2648.5362847222,0,9,0,6,7,0,0,7,1,"1",2,2,-0.504454043713144,1.4142135623731,1,1,0 +"volk",0.3490308455,1.9477412745,-0.157883478,"https://salsa.debian.org/bottoms/pkg-volk","https://github.com/gnuradio/volk",4752.915,39,93,0,74,106,0,0,129,3,"3",1.70454545454545,1.82170542635659,0.94306055365036,1.34970568138264,1,1,0 +"voltron",-1.8139477845,1.3185040904,-2.8023383764,"https://salsa.debian.org/python-team/packages/voltron","https://github.com/snare/voltron.git",2775.5086458333,5,31,0,19,212,0,1,213,2,"2",1.86111111111111,1.99530516431925,-0.417115037271158,1.4125527120498,1.00469483568075,1,0 +"voluptuous",-0.403966828,1.2358837228,-0.7514608215,"https://salsa.debian.org/python-team/packages/voluptuous","https://github.com/alecthomas/voluptuous",4900.0540740741,38,69,0,73,81,0,0,132,3,"3",1.64485981308411,1.61363636363636,1.04427140320825,1.27028987386201,1,1,0 +"voms",-0.756674276,-0.2090198319,-0.9203293452,"https://salsa.debian.org/ellert/voms","https://github.com/italiangrid/voms",3745.5262731482,4,20,0,8,29,0,5,35,2,"2",1.83333333333333,1.82857142857143,0.250119745633815,1.35224680756563,1.14285714285714,1,0 +"waitress",-0.001435195,0.7796936159,-0.2577457307,"https://salsa.debian.org/python-team/packages/waitress","https://github.com/Pylons/waitress.git",4372.6596990741,10,50,0,48,135,0,0,153,3,"3",1.83333333333333,1.88235294117647,0.681498746918994,1.37198868114007,1,0,0 +"wal2json",-1.8275745539,0.5424600488,-2.3404171148,"https://salsa.debian.org/postgresql/wal2json","https://github.com/eulerto/wal2json.git",3393.2528703704,6,15,0,13,173,0,0,177,2,"2",1.71428571428571,1.9774011299435,0.00780552287450398,1.40620095645804,1,1,0 +"wand",-0.67759885,-0.1056309981,-0.8962104321,"https://salsa.debian.org/debian/wand","https://github.com/emcconville/wand",4461.4997222222,24,94,1,85,430,0,0,439,3,"3",1.79661016949153,1.97949886104784,0.742608103995916,1.40694664470542,1,0,0 +"WavPack",0.5006437508,1.2816911597,0.1442013441,"https://salsa.debian.org/multimedia-team/wavpack","https://github.com/dbry/WavPack",5719.9072569445,11,19,0,26,86,0,0,87,4,"4",1.63333333333333,1.98850574712644,1.60821431010235,1.41014387461934,1,1,0 +"libwbxml",0.5716576747,2.0439677491,-0.0953236447,"https://salsa.debian.org/debian/wbxml2","https://github.com/libwbxml/libwbxml.git",5170.821412037,0,19,0,15,25,0,0,28,4,"4",2,1.89285714285714,1.23052099380954,1.37581144887559,1,0,0 +"wcwidth",0.3330909557,1.8989641963,-0.0738762364,"https://salsa.debian.org/python-team/packages/wcwidth","https://github.com/jquast/wcwidth",3540.9241550926,5,18,0,16,80,0,0,81,2,"2",1.78260869565217,1.98765432098765,0.109382458002641,1.40984194893884,1,1,0 +"websocketpp",-0.3732259601,1.2705562016,-0.7134226458,"https://salsa.debian.org/debian/websocketpp","https://github.com/zaphoyd/websocketpp.git",3911.9273263889,7,63,0,40,237,0,21,277,3,"3",1.9,1.85559566787004,0.364580109556845,1.3622025061899,1.07581227436823,0,0 +"websploit",-0.4221028192,2.1023366852,-1.0726176237,"https://salsa.debian.org/pkg-security-team/websploit","https://github.com/websploit/websploit",0.0014814815,1,1,0,1,3,0,0,4,1,"1",1.5,1.75,-2.32627098259531,1.3228756555323,1,0,0 +"weevely3",-0.2507372174,2.1708290167,-0.8636427805,"https://salsa.debian.org/pkg-security-team/weevely","https://github.com/epinna/weevely3.git",3185.5150578704,7,21,0,18,24,0,3,39,2,"2",1.75,1.61538461538462,-0.13508867855179,1.27097781860449,1.07692307692308,1,0 +"welle.io",-1.1503735792,0.8698707092,-1.5560375998,"https://salsa.debian.org/debian-hamradio-team/welle.io","https://github.com/AlbrechtL/welle.io",2902.9566203704,11,44,0,35,243,0,3,249,2,"2",1.8,1.97590361445783,-0.329448876134135,1.40566838708773,1.01204819277108,1,0 +"weresync",0.8686224385,5.3149179418,-0.6110888212,"https://salsa.debian.org/python-team/packages/weresync","https://github.com/DonyorM/weresync.git",2224.0163194445,5,4,0,4,47,0,0,47,1,"1",1.44444444444444,2,-0.79646367208966,1.4142135623731,1,1,0 +"weupnp",-1.9200689609,0.314231077,-2.3479232511,"https://salsa.debian.org/debian/weupnp","https://github.com/bitletorg/weupnp.git",896.40375,1,9,0,8,23,0,2,27,1,"1",1.9,1.85185185185185,-1.70967314335182,1.36082763487954,1.07407407407407,1,1 +"wfmath",-0.3893875883,0.837955788,-0.9792345009,"https://salsa.debian.org/games-team/wfmath","https://github.com/worldforge/wfmath",5506.8696990741,0,8,0,7,8,0,0,9,4,"4",2,1.88888888888889,1.46167463425158,1.37436854187255,1,1,0 +"wfuzz",0.3494531903,3.0367255196,-0.346839296,"https://salsa.debian.org/pkg-security-team/wfuzz","https://github.com/xmendez/wfuzz.git",3000.7348148148,13,27,0,24,91,0,5,111,2,"2",1.675,1.81981981981982,-0.262191322760035,1.34900697545262,1.04504504504505,1,0 +"whatthepatch",-1.2344880678,1.15651314,-1.8143537794,"https://salsa.debian.org/python-team/packages/whatthepatch","https://github.com/cscorley/whatthepatch",3792.0029513889,6,11,0,11,23,0,0,23,3,"3",1.64705882352941,2,0.282089119635728,1.4142135623731,1,0,0 +"whichcraft",-0.303651311,1.9645474175,-0.7638381926,"https://salsa.debian.org/python-team/packages/whichcraft","https://github.com/cookiecutter/whichcraft",2896.9858101852,2,14,0,8,22,0,0,22,2,"2",1.875,2,-0.333555948135204,1.4142135623731,1,0,0 +"wanderlust",-0.3325500668,0.46879212,-0.6623736703,"https://salsa.debian.org/debian/wl","https://github.com/wanderlust/wanderlust",5747.0710416667,6,25,0,16,85,0,0,85,4,"4",1.80645161290323,2,1.62689914787397,1.4142135623731,1,1,0 +"wanderlust",-0.9633885518,-0.6844818162,-1.0856880817,"https://salsa.debian.org/debian/wl-beta","https://github.com/wanderlust/wanderlust",5747.0710416667,6,25,0,16,85,0,0,85,4,"4",1.80645161290323,2,1.62689914787397,1.4142135623731,1,1,0 +"WPEBackend-fdo",0.5730095986,3.296980661,-0.0681747088,"https://salsa.debian.org/webkit-team/wpebackend-fdo","https://github.com/Igalia/WPEBackend-fdo",2058.3566319445,11,16,1,15,33,0,0,35,1,"1",1.59259259259259,1.94285714285714,-0.91041408135298,1.39386410487434,1,0,0 +"Xastir",0.1089482482,0.8635088142,-0.3202862478,"https://salsa.debian.org/debian-hamradio-team/xastir","https://github.com/Xastir/Xastir.git",5658.7705902778,2,27,0,23,47,0,1,57,4,"4",1.93103448275862,1.82456140350877,1.56616093976948,1.35076326701194,1.01754385964912,1,1 +"xcape",0.1031866498,2.6635244357,-0.4881717246,"https://salsa.debian.org/debian/xcape","https://github.com/alols/xcape",2160.4542361111,3,26,0,19,215,0,0,216,1,"1",1.89655172413793,1.99537037037037,-0.840185385674748,1.4125757927879,1,1,0 +"xcffib",0.3422766078,1.6439736239,-0.2089170835,"https://salsa.debian.org/python-team/packages/xcffib","https://github.com/tych0/xcffib.git",3466.6135069445,10,9,0,14,67,0,0,67,2,"2",1.47368421052632,2,0.058267253713133,1.4142135623731,1,1,0 +"xCHM",0.2106957608,0.7959718479,-0.0859691061,"https://salsa.debian.org/debian/xchm","https://github.com/rzvncj/xCHM.git",5664.2862037037,3,5,0,6,25,0,0,25,4,"4",1.625,2,1.56995490085141,1.4142135623731,1,1,0 +"xcscope.el",0.2222567121,2.7358133073,-0.5096652742,"https://salsa.debian.org/debian/xcscope-el","https://github.com/dkogan/xcscope.el",3521.9445949074,2,6,0,6,30,0,0,31,2,"2",1.75,1.96774193548387,0.0963272079090341,1.40276225194574,1,0,0 +"xdffileio",-0.3370360933,3.1399742139,-1.5172901103,"https://salsa.debian.org/med-team/xdffileio","https://github.com/mmlabs-mindmaze/xdffileio.git",3980.6902777778,1,9,0,3,4,0,0,6,3,"3",1.9,1.66666666666667,0.41187928397379,1.29099444873581,1,1,0 +"xdms-debian",-0.3245085497,1.1111188277,-0.7327199722,"https://github.com/glaubitz/xdms-debian","https://github.com/glaubitz/xdms-debian",2621.1444212963,2,1,0,3,2,0,0,5,1,"1",1.33333333333333,1.4,-0.523295767339276,1.18321595661992,1,0,0 +"xdotool",1.2968912917,2.6433354619,0.5854640504,"https://salsa.debian.org/debian/xdotool","https://github.com/jordansissel/xdotool.git",5532.0414351852,34,28,0,50,581,0,0,582,4,"4",1.45161290322581,1.99828178694158,1.4789892246327,1.41360595179193,1,1,0 +"xen-tools",0.1849226805,0.4044499915,0.02937965,"https://github.com/xen-tools/xen-tools","https://github.com/xen-tools/xen-tools",5773.4961921296,25,18,2,29,33,0,0,52,4,"4",1.41860465116279,1.63461538461538,1.64507590985834,1.2785207798919,1,0,0 +"xmldiff",0.559598996,1.5801414897,0.007932953,"https://salsa.debian.org/debian/xmldiff","https://github.com/Shoobx/xmldiff.git",5659.7240162037,11,15,0,19,92,0,0,95,4,"4",1.57692307692308,1.96842105263158,1.56681676181103,1.40300429530047,1,0,0 +"xmltv",-0.0141973655,0.1968271173,-0.1465991903,"https://salsa.debian.org/nickm/xmltv","https://github.com/XMLTV/xmltv.git",5729.3252314815,14,54,0,44,137,0,0,159,4,"4",1.79411764705882,1.86163522012579,1.61469254309384,1.36441753877828,1,1,0 +"xmoto",-0.0128577775,0.350476721,-0.2212793709,"https://salsa.debian.org/games-team/xmoto","https://github.com/xmoto/xmoto",5752.6098148148,7,30,1,14,32,0,1,34,4,"4",1.81081081081081,1.94117647058824,1.6307090395656,1.39326109203847,1.02941176470588,1,0 +"yadm",0.155795293,2.4789916734,-0.5346609613,"https://salsa.debian.org/debian/yadm","https://github.com/TheLocehiliosan/yadm",1719.5473611111,26,32,0,34,348,0,0,348,1,"1",1.55172413793103,2,-1.14346688771949,1.4142135623731,1,1,0 +"yanc",-1.5009992611,1.4616219544,-2.2668515294,"https://salsa.debian.org/python-team/packages/yanc","https://github.com/0compute/yanc",1361.9793865741,0,3,0,2,13,0,0,13,1,"1",2,2,-1.3894230261913,1.4142135623731,1,0,0 +"yatm",-0.9969942564,0.469884003,-1.3959449427,"https://salsa.debian.org/debian/yatm","https://github.com/mlang/yatm.git",2272.488912037,0,3,0,1,4,0,0,5,1,"1",2,1.8,-0.763121391614999,1.34164078649987,1,0,0 +"yder",-0.5735586705,1.4948558419,-1.0176765614,"https://salsa.debian.org/debian-iot-team/oauth2/yder.git","https://github.com/babelouest/yder",1282.873275463,2,11,0,9,16,0,0,16,1,"1",1.84615384615385,2,-1.44383683001029,1.4142135623731,1,1,0 +"ydpdict",-1.6620122332,-0.9650225761,-1.8878460738,"https://github.com/porridge/ydpdict","https://github.com/porridge/ydpdict",5724.9537731482,0,4,0,3,0,0,0,3,4,"4",2,1,1.61168559871483,1,1,1,0 diff --git a/verbose_data/deb_octo_data.csv b/verbose_data/deb_octo_data.csv new file mode 100644 index 0000000..31c57a5 --- /dev/null +++ b/verbose_data/deb_octo_data.csv @@ -0,0 +1,3061 @@ +"project_name","underproduction_mean","underproduction_low","underproduction_high","debian_vcs_link","upstream_vcs_link","age_of_project","contributors","collaborators","milestone_count","api_contrib_count","issue_contrib_count","file_contrib_count","wiki_contrib_count","total_contrib","new.age","new.age.factor","mmt","issue_mmt" +"0xFFFF",-0.510168673,1.4527994311,-1.0011708662,"https://salsa.debian.org/debian/0xffff","https://github.com/pali/0xFFFF",5557.8427777778,3,11,0,6,9,0,0,9,4,"4",1.78571428571429,2 +"3270font",0.7956265926,4.3574626903,-0.214217071,"https://github.com/kilobyte/3270font/tree/debian","https://github.com/kilobyte/3270font",3596.6082060185,6,15,0,9,3,0,0,11,2,"2",1.71428571428571,1.27272727272727 +"4pane-debian-dir",-0.2426279425,2.299894807,-0.8194220994,"https://github.com/dghart/4pane-debian-dir/tree/master/","https://github.com/dghart/4pane-debian-dir",2236.6859722222,0,2,0,1,2,0,0,2,1,"1",2,2 +"4ti2",0.4764408337,3.0285400273,-0.2191943656,"https://salsa.debian.org/math-team/4ti2","https://github.com/4ti2/4ti2.git",5656.5603819445,3,11,0,6,18,0,0,18,4,"4",1.78571428571429,2 +"6tunnel",-0.563131582,0.346490728,-0.8398599484,"https://salsa.debian.org/debian/6tunnel","https://github.com/wojtekka/6tunnel",2673.0241203704,1,7,0,5,18,0,1,19,1,"1",1.875,1.94736842105263 +"a2jmidid",0.3594669173,1.948434404,-0.1562277334,"https://salsa.debian.org/multimedia-team/a2jmidid","https://github.com/linuxaudio/a2jmidid.git",4551.7947916667,8,8,0,12,23,0,0,27,3,"3",1.5,1.85185185185185 +"abGate",0.1706833434,2.3128885166,-0.4447167424,"https://salsa.debian.org/multimedia-team/abgate","https://github.com/antanasbruzas/abGate.git",1677.5786226852,2,8,0,4,5,0,0,6,1,"1",1.8,1.83333333333333 +"link",0.2419062498,3.4521460543,-0.7141549374,"https://salsa.debian.org/multimedia-team/ableton-link","https://github.com/Ableton/link.git",2835.8410648148,20,10,0,19,81,0,0,88,2,"2",1.33333333333333,1.92045454545455 +"acme-tiny",-0.0997740414,0.6982852517,-0.3572560835,"https://salsa.debian.org/letsencrypt-team/acme-tiny","https://github.com/diafygi/acme-tiny.git",2161.2252314815,7,34,0,36,354,0,0,355,1,"1",1.82926829268293,1.99718309859155 +"acpi_call",0.1056920793,1.3196660142,-0.2309830486,"https://salsa.debian.org/moonsweep/acpi-call","https://github.com/nix-community/acpi_call.git",4711.2498958333,14,26,0,29,24,0,0,39,3,"3",1.65,1.61538461538462 +"adapta-kde",-0.0885623802,2.0889906357,-0.5313636783,"https://salsa.debian.org/debian/adapta-kde","https://github.com/PapirusDevelopmentTeam/adapta-kde.git",636.9053819444,2,5,0,3,0,0,0,3,1,"1",1.71428571428571,1 +"admesh",0.1260876875,1.8100481532,-0.381631879,"https://salsa.debian.org/science-team/admesh","https://github.com/admesh/admesh",3319.1463078704,15,9,1,20,42,0,0,44,2,"2",1.375,1.95454545454545 +"ADMS",-0.6746373026,2.0836908399,-1.2638452949,"https://salsa.debian.org/science-team/adms","https://github.com/Qucs/ADMS.git",3397.3394444445,6,10,0,12,44,0,3,49,2,"2",1.625,1.89795918367347 +"ADOL-C",-0.218347665,0.2989988071,-0.4200973016,"https://salsa.debian.org/science-team/adolc","https://github.com/coin-or/ADOL-C",5292.5953472222,11,44,0,11,43,0,2,48,4,"4",1.8,1.89583333333333 +"taplib",-0.1607320251,2.2507776056,-0.6544297324,"https://salsa.debian.org/debian-astro-team/adql","https://github.com/gmantele/taplib.git",3533.9449074074,2,12,0,7,26,0,0,26,2,"2",1.85714285714286,2 +"adwaita-qt",0.205201025,2.3560485193,-0.2873294601,"https://salsa.debian.org/debian/adwaita-qt","https://github.com/FedoraQt/adwaita-qt.git",3324.8509953704,3,11,0,9,135,0,0,137,2,"2",1.78571428571429,1.98540145985401 +"aeskulap",-0.0079946864,0.7360602484,-0.280025211,"https://salsa.debian.org/med-team/aeskulap","https://github.com/pipelka/aeskulap.git",0.1217013889,0,2,0,2,3,0,0,4,1,"1",2,1.75 +"afew",-0.174094467,3.0914363808,-1.0829316549,"https://salsa.debian.org/python-team/packages/afew","https://github.com/afewmail/afew",4444.5631134259,14,62,1,59,188,0,0,190,3,"3",1.81578947368421,1.98947368421053 +"AFFLIBv3",0.4855383072,1.2966231457,0.0866885423,"https://salsa.debian.org/pkg-security-team/afflib","https://github.com/sshock/AFFLIBv3",3923.2419675926,1,18,0,14,23,0,0,28,3,"3",1.94736842105263,1.82142857142857 +"afio",0.7471975104,2.0817065146,0.0678453147,"https://salsa.debian.org/debian/afio","https://github.com/kholtman/afio",3009.1574652778,0,6,0,4,8,0,0,8,2,"2",2,2 +"AFLplusplus",-0.6866375311,2.5698791713,-1.4766466472,"https://salsa.debian.org/pkg-security-team/aflplusplus","https://github.com/AFLplusplus/AFLplusplus.git",1658.7534375,94,190,0,201,0,0,0,201,1,"1",1.66901408450704,1 +"aggdraw",-1.0738283571,1.0896722547,-1.5311943301,"https://salsa.debian.org/debian-gis-team/aggdraw","https://github.com/pytroll/aggdraw",4403.4778240741,4,15,2,15,48,0,0,49,3,"3",1.78947368421053,1.97959183673469 +"aha",-0.0329000287,2.2809487303,-0.5337481366,"https://salsa.debian.org/debian/aha","https://github.com/theZiz/aha.git",3422.3746180556,1,26,0,18,0,0,1,19,2,"2",1.96296296296296,1 +"aiodns",0.1656826228,1.9021756708,-0.2783622395,"https://salsa.debian.org/python-team/packages/aiodns","https://github.com/saghul/aiodns.git",3490.3476273148,13,17,0,27,96,0,0,100,2,"2",1.56666666666667,1.96 +"aioprocessing",-1.8106172723,-0.4031506429,-2.0700475194,"https://github.com/davesteele/aioprocessing","https://github.com/davesteele/aioprocessing",3054.801087963,3,13,0,8,1,0,0,8,2,"2",1.8125,1.125 +"airspyone_host",0.135032826,1.7638004482,-0.2266634267,"https://salsa.debian.org/bottoms/pkg-airspy-host","https://github.com/airspy/airspyone_host.git",3592.9147685185,9,15,0,21,60,0,6,68,2,"2",1.625,1.88235294117647 +"airspyhf",0.4277792447,3.1863173209,-0.2431051192,"https://salsa.debian.org/debian-hamradio-team/airspyhf","https://github.com/airspy/airspyhf.git",2334.5221527778,3,13,0,13,36,0,0,38,1,"1",1.8125,1.94736842105263 +"aiscm",-2.1266027747,-0.9022998492,-2.4482757524,"https://github.com/wedesoft/aiscm","https://github.com/wedesoft/aiscm",3606.1918865741,0,8,0,3,7,0,0,8,2,"2",2,1.875 +"alabaster",1.5840034231,5.0180871348,0.3754116681,"https://github.com/jbouse-debian/alabaster","https://github.com/jbouse-debian/alabaster",3086.3917592593,1,6,0,4,4,0,0,5,2,"2",1.85714285714286,1.8 +"amavisd-milter",0.615386065,3.5879174633,-0.470593397,"https://salsa.debian.org/debian/amavisd-milter","https://github.com/prehor/amavisd-milter",5582.9392824074,1,5,0,3,7,0,0,7,4,"4",1.83333333333333,2 +"amazon-ecr-credential-helper",-1.2935017996,1.3375714894,-1.8855602579,"https://github.com/awslabs/amazon-ecr-credential-helper/tree/debian","https://github.com/awslabs/amazon-ecr-credential-helper",2759.7970717593,31,49,1,56,371,0,0,396,2,"2",1.6125,1.93686868686869 +"amora",-0.6385985537,1.533812873,-1.3373354269,"https://github.com/amora/amora/tree/master/amora-server","https://github.com/amora/amora",4404.2341666667,0,11,0,6,5,0,0,9,3,"3",2,1.55555555555556 +"amsynth",0.3306364812,1.2209617467,-0.1269359447,"https://salsa.debian.org/multimedia-team/amsynth","https://github.com/nixxcode/amsynth.git",5332.9271990741,11,24,0,21,100,0,3,109,4,"4",1.68571428571429,1.91743119266055 +"amule",0.4839430086,0.6876326423,0.3238736448,"https://salsa.debian.org/debian/amule","https://github.com/amule-project/amule.git",5047.6080555556,11,25,0,16,46,0,0,55,4,"4",1.69444444444444,1.83636363636364 +"amule-emc",-0.3584249255,1.8578303929,-0.8058880504,"https://salsa.debian.org/morph/amule-emc","https://github.com/palopezv/amule-emc",2735.137662037,0,2,0,0,1,0,0,1,1,"1",2,2 +"analog-ce",0.3100100337,0.6308951381,0.1129534728,"https://salsa.debian.org/debian/analog","https://github.com/c-amie/analog-ce.git",798.2990509259,2,1,0,1,4,0,0,5,1,"1",1.33333333333333,1.8 +"anfo",-0.5164343879,1.1141228746,-0.8858012402,"https://salsa.debian.org/med-team/anfo","https://github.com/udo-stenzel/anfo",2083.7738310185,0,5,0,1,1,0,1,2,1,"1",2,1.5 +"anomaly",-2.6979232432,-0.9294432931,-3.0157661638,"https://github.com/mogaal/anomaly","https://github.com/mogaal/anomaly",224.8161226852,0,2,0,1,2,0,0,3,1,"1",2,1.66666666666667 +"anosql",-1.7531962484,0.6178873531,-2.3213037286,"https://salsa.debian.org/python-team/packages/anosql","https://github.com/honza/anosql",2207.9932523148,1,18,0,12,24,0,0,24,1,"1",1.94736842105263,2 +"ansible-lint",0.2113200286,2.3970134545,-0.4192549848,"https://salsa.debian.org/python-team/packages/ansible-lint","https://github.com/ansible/ansible-lint",3772.1254976852,239,77,4,263,0,0,0,263,3,"3",1.24367088607595,1 +"antpm",-0.4257977771,1.2499417918,-0.9097264377,"https://salsa.debian.org/debian/antpm","https://github.com/ralovich/antpm",5246.6502893519,2,16,0,6,4,0,0,7,4,"4",1.88888888888889,1.57142857142857 +"anypaper",-0.8366781332,1.8293957466,-1.525331321,"https://github.com/mogaal/anypaper","https://github.com/mogaal/anypaper",358.8230671296,0,1,0,1,0,0,0,1,1,"1",2,1 +"aoeui",-1.5753745078,-0.1018330597,-2.0145689052,"https://salsa.debian.org/debian/aoeui","https://github.com/pklausler/aoeui.git",0.0311342593,0,4,0,1,2,0,0,3,1,"1",2,1.66666666666667 +"apachetop",-0.1433968655,0.1384791106,-0.2436187019,"https://salsa.debian.org/debian/apachetop","https://github.com/tessus/apachetop.git",4171.4287847222,1,5,0,3,11,0,0,12,3,"3",1.83333333333333,1.91666666666667 +"apel",-0.1699911676,0.0467119457,-0.2503884599,"https://salsa.debian.org/debian/apel","https://github.com/wanderlust/apel",5064.9154166667,2,8,0,5,0,0,0,5,4,"4",1.8,1 +"apipkg",0.1848523093,2.3386412167,-0.297646363,"https://salsa.debian.org/python-team/packages/apipkg","https://github.com/pytest-dev/apipkg",4796.3536574074,4,14,0,15,32,0,0,36,3,"3",1.77777777777778,1.88888888888889 +"aplpy",-0.0173305787,1.6394741457,-0.5266587065,"https://salsa.debian.org/debian-astro-team/aplpy","https://github.com/aplpy/aplpy.git",4761.8146296296,3,44,0,33,0,0,1,34,3,"3",1.93617021276596,1 +"appdirs",0.3458277639,1.9577727359,-0.1122252661,"https://salsa.debian.org/python-team/packages/appdirs","https://github.com/ActiveState/appdirs.git",4580.7970601852,5,36,0,28,143,0,0,144,3,"3",1.8780487804878,1.99305555555556 +"appstream-generator",-1.1332713071,-0.1060546301,-1.4824521416,"https://salsa.debian.org/pkgutopia-team/appstream-generator","https://github.com/ximion/appstream-generator",2846.9885185185,14,5,0,14,47,0,0,47,2,"2",1.26315789473684,2 +"apriltag",-1.1179244852,1.091725818,-1.6047836993,"https://salsa.debian.org/science-team/apriltag","https://github.com/AprilRobotics/apriltag.git",1884.0502083333,21,28,0,42,0,0,0,42,1,"1",1.57142857142857,1 +"aprsdigi",0.1781157768,2.7404004262,-0.7343395696,"https://salsa.debian.org/debian-hamradio-team/aprsdigi","https://github.com/n2ygk/aprsdigi.git",5178.2461574074,2,9,0,4,7,0,0,7,4,"4",1.81818181818182,2 +"aprx",-0.2704326877,2.1233467944,-0.9280144637,"https://salsa.debian.org/debian-hamradio-team/aprx","https://github.com/PhirePhly/aprx",4964.0779861111,6,4,1,7,43,0,0,43,3,"3",1.4,2 +"apt-forktracer",0.0547352043,1.112259075,-0.2401275584,"https://github.com/porridge/apt-forktracer","https://github.com/porridge/apt-forktracer",5457.9246990741,1,3,0,2,1,0,0,2,4,"4",1.75,1.5 +"apt-offline",0.7681910278,1.8077281258,0.1487399152,"https://github.com/rickysarraf/apt-offline","https://github.com/rickysarraf/apt-offline",5588.93,4,18,3,12,62,0,2,69,4,"4",1.81818181818182,1.89855072463768 +"apt-venv",0.5985278149,4.8192892935,-0.7291864283,"https://salsa.debian.org/debian/apt-venv","https://github.com/LeoIannacone/apt-venv",1672.1250694445,0,3,0,1,7,0,0,7,1,"1",2,2 +"aptitude-robot",0.0330441368,2.6987643495,-0.6758866251,"https://github.com/elmar/aptitude-robot","https://github.com/elmar/aptitude-robot",3822.3247685185,3,7,1,6,9,0,0,10,3,"3",1.7,1.9 +"apulse-debian",-0.1771724569,1.2997369797,-0.4576897761,"https://github.com/exaexa/apulse-debian","https://github.com/exaexa/apulse-debian",2693.7106712963,2,11,0,9,2,0,0,9,1,"1",1.84615384615385,1.22222222222222 +"apvlv",0.8026186076,2.4912926837,-0.0110446926,"https://salsa.debian.org/debian/apvlv","https://github.com/naihe2010/apvlv",4571.1944675926,1,28,0,18,92,0,0,94,3,"3",1.96551724137931,1.97872340425532 +"arachne-pnr",-0.2393988119,0.9055823033,-0.5128499486,"https://salsa.debian.org/science-team/arachne-pnr","https://github.com/cseed/arachne-pnr.git",1523.5826388889,1,29,0,24,90,0,0,91,1,"1",1.96666666666667,1.98901098901099 +"ArbiterJS",-0.9372250205,1.3094171556,-1.3679284559,"https://salsa.debian.org/js-team/arbiterjs","https://github.com/ArbiterJS/ArbiterJS",777.6784722222,0,1,0,0,0,0,0,0,1,"1",2,NA +"arc",1.0034305192,2.95692526,0.1704629703,"https://git.hadrons.org/cgit/debian/pkgs/arc.git","https://github.com/ani6al/arc",0.1011921296,1,1,0,1,0,0,0,1,1,"1",1.5,1 +"arc-theme",0.0557512099,0.9470106383,-0.1788662281,"https://github.com/UbuntuBudgie/arc-theme/tree/debian","https://github.com/UbuntuBudgie/arc-theme",2773.5425578704,36,30,0,2,2,0,0,3,2,"2",1.45454545454545,1.66666666666667 +"arch-test",0.0607618911,0.902121307,-0.1116504733,"https://github.com/kilobyte/arch-test/tree/debian","https://github.com/kilobyte/arch-test",2721.0558912037,2,7,0,6,10,0,0,10,1,"1",1.77777777777778,2 +"archmage",-0.5766750111,-0.3037651495,-0.666439779,"https://salsa.debian.org/python-team/packages/archmage","https://github.com/dottedmag/archmage",4875.1846412037,1,4,0,3,16,0,0,16,3,"3",1.8,2 +"arcp-py",-5.0400309655,-2.6837801512,-5.4802256243,"https://salsa.debian.org/python-team/packages/arcp","https://github.com/stain/arcp-py.git",744.5613194444,0,3,0,2,4,0,0,4,1,"1",2,2 +"ardentryst",1.6336595561,4.7901963616,0.4114961199,"https://salsa.debian.org/games-team/ardentryst","https://github.com/ardentryst/ardentryst",3087.7143865741,4,6,0,6,7,0,0,7,2,"2",1.6,2 +"arename",-0.7754375198,0.9646514013,-1.1302132776,"https://salsa.debian.org/perl-team/modules/packages/arename","https://github.com/ft/arename.git",5509.5740972222,2,1,0,3,3,0,0,4,4,"4",1.33333333333333,1.75 +"phc-winner-argon2",0.743835667,2.5300173326,0.1203530186,"https://salsa.debian.org/pkg-security-team/argon2","https://github.com/P-H-C/phc-winner-argon2",2090.9970833333,21,70,0,62,101,0,0,123,1,"1",1.76923076923077,1.82113821138211 +"aif",-0.0994853605,0.2382471007,-0.2885738031,"https://salsa.debian.org/pkg-security-team/arno-iptables-firewall","https://github.com/arno-iptables-firewall/aif.git",5173.1893171296,1,13,0,3,50,0,0,50,4,"4",1.92857142857143,2 +"arp-scan",0.7973854024,2.157870748,0.1913515465,"https://salsa.debian.org/pkg-security-team/arp-scan","https://github.com/royhills/arp-scan",5689.2689583333,1,16,0,11,61,0,1,64,4,"4",1.94117647058824,1.953125 +"arpack-ng",0.3837318586,0.9028165971,0.1090371111,"https://salsa.debian.org/science-team/arpack","https://github.com/opencollab/arpack-ng.git",4374.6474884259,45,30,0,53,0,0,0,53,3,"3",1.4,1 +"arping",0.530645087,1.2970011805,0.131538231,"https://salsa.debian.org/debian/arping","https://github.com/ThomasHabets/arping",5640.3308564815,6,8,1,10,48,0,0,49,4,"4",1.57142857142857,1.97959183673469 +"assess",-1.4000321709,1.1332183932,-2.0278507888,"https://salsa.debian.org/emacsen-team/assess-el","https://github.com/phillord/assess.git",2948.0093402778,0,8,0,6,12,0,0,13,2,"2",2,1.92307692307692 +"astLib",-0.4953363519,0.6080154454,-0.6729060494,"https://salsa.debian.org/debian-astro-team/astlib","https://github.com/mattyowl/astLib.git",2666.6349305556,0,4,0,2,5,0,0,5,1,"1",2,2 +"astromenace",-0.4083684893,0.5804361033,-0.6175886343,"https://salsa.debian.org/games-team/astromenace","https://github.com/viewizard/astromenace.git",5567.4927893519,5,4,0,7,21,0,0,22,4,"4",1.44444444444444,1.95454545454545 +"astropy-healpix",-0.4944474025,0.2280631702,-0.7220614086,"https://salsa.debian.org/debian-astro-team/astropy-healpix","https://github.com/astropy/astropy-healpix",2653.9758333333,3,14,5,12,33,0,2,35,1,"1",1.82352941176471,1.94285714285714 +"atig",-1.8648493244,0.279641993,-2.4212366269,"https://salsa.debian.org/ruby-team/atig","https://github.com/atig/atig",4572.5188078704,2,14,1,10,17,0,0,17,3,"3",1.875,2 +"atlas-cpp",0.0341726983,1.1760438151,-0.4721381555,"https://salsa.debian.org/games-team/atlas-cpp","https://github.com/worldforge/atlas-cpp",5588.9221643519,1,7,0,7,9,0,0,11,4,"4",1.875,1.81818181818182 +"audacious-plugins",1.7224717183,2.5284554407,1.1638170855,"https://salsa.debian.org/multimedia-team/audacious-plugins","https://github.com/audacious-media-player/audacious-plugins",5769.3870138889,19,100,0,83,0,0,0,83,4,"4",1.84033613445378,1 +"audiofile",0.422362873,1.1370882832,0.0919717085,"https://salsa.debian.org/multimedia-team/audiofile","https://github.com/mpruett/audiofile",1573.8945023148,10,2,0,8,60,0,0,61,1,"1",1.16666666666667,1.98360655737705 +"austin",-1.9885885289,0.9749582973,-2.7198737394,"https://github.com/P403n1x87/austin","https://github.com/P403n1x87/austin",1837.728599537,4,7,8,7,31,0,1,34,1,"1",1.63636363636364,1.91176470588235 +"autocutsel-debian",0.1797843854,2.4764961713,-0.3873891003,"https://github.com/elmar/autocutsel-debian","https://github.com/elmar/autocutsel-debian",3741.7552430556,3,8,0,7,1,0,0,7,2,"2",1.72727272727273,1.14285714285714 +"autolog",-0.4586466955,0.5238636181,-1.0843460423,"https://salsa.debian.org/pkg-security-team/autolog","https://github.com/JKDingwall/autolog.git",1891.041099537,4,11,0,5,2,0,0,6,1,"1",1.73333333333333,1.33333333333333 +"automx-debian",-0.602057718,1.6606574872,-1.3781487507,"https://github.com/wreiner/automx-debian.git","https://github.com/wreiner/automx-debian.git",38.1884490741,1,1,0,1,0,0,0,1,1,"1",1.5,1 +"autopostgresqlbackup",0.0717331465,1.1779509822,-0.3973782275,"https://salsa.debian.org/kolter/autopostgresqlbackup","https://github.com/k0lter/autopostgresqlbackup",1670.5722222222,8,3,0,6,19,0,0,21,1,"1",1.27272727272727,1.9047619047619 +"autorenamer",-0.3876192426,1.6252404011,-0.8867624476,"https://github.com/porridge/autorenamer","https://github.com/porridge/autorenamer",3637.0090277778,4,1,0,1,3,0,0,3,2,"2",1.2,2 +"averell",-3.3917060035,-0.2624325775,-4.2312153625,"https://github.com/jeanparpaillon/averell","https://github.com/jeanparpaillon/averell",585.8797453704,0,1,0,0,2,0,0,2,1,"1",2,2 +"pkg-avr-evtd",0.7552713955,5.6393427141,-0.8294940805,"https://github.com/rbrito/pkg-avr-evtd","https://github.com/rbrito/pkg-avr-evtd",3784.5630787037,0,1,0,0,1,0,0,1,3,"3",2,2 +"awesfx",0.8705331012,2.216301783,0.1561432022,"https://salsa.debian.org/multimedia-team/awesfx","https://github.com/tiwai/awesfx.git",1324.8292592593,0,1,0,1,2,0,0,2,1,"1",2,2 +"biber",0.025597249,0.3975294935,-0.1139709408,"https://github.com/debian-tex/biber","https://github.com/debian-tex/biber",5232.9484259259,2,17,0,7,1,0,0,7,4,"4",1.89473684210526,1.14285714285714 +"biblesync",0.3250691142,3.3691024007,-0.4547464712,"https://salsa.debian.org/pkg-crosswire-team/biblesync","https://github.com/karlkleinpaste/biblesync.git",2205.1738773148,0,6,0,3,7,0,0,7,1,"1",2,2 +"bibtool",0.6789918484,1.7753249658,0.1299255999,"https://salsa.debian.org/tex-team/bibtool","https://github.com/ge-ne/bibtool.git",4734.0663541667,1,5,0,3,29,0,0,29,3,"3",1.83333333333333,2 +"binkd",-1.5291148732,-0.7208993868,-1.8984875134,"https://salsa.debian.org/md/binkd","https://github.com/pgul/binkd",5661.947349537,4,23,0,12,24,0,0,27,4,"4",1.85185185185185,1.88888888888889 +"bino",0.1952576502,1.8817060276,-0.4774605999,"https://github.com/schaal/bino","https://github.com/schaal/bino",3762.7609490741,0,4,0,2,1,0,0,2,2,"2",2,1.5 +"binwalk",0.2237508811,1.3345373481,-0.1513640072,"https://salsa.debian.org/pkg-security-team/binwalk","https://github.com/ReFirmLabs/binwalk",3364.812650463,24,70,1,71,16,0,25,105,2,"2",1.74468085106383,1.15238095238095 +"biometric-authentication",-0.485933223,1.5346031672,-1.0554082079,"https://github.com/ukui/biometric-authentication","https://github.com/ukui/biometric-authentication",1286.1941203704,2,8,0,4,14,0,0,14,1,"1",1.8,2 +"bitstruct",-1.0422111169,1.6758733437,-1.7408364383,"https://salsa.debian.org/python-team/packages/bitstruct","https://github.com/eerimoq/bitstruct",3110.3722916667,2,10,0,6,34,0,0,34,2,"2",1.83333333333333,2 +"blackboxwm",0.9240670694,1.5485949706,0.4955253,"https://salsa.debian.org/debian/blackbox","https://github.com/bbidulock/blackboxwm",5638.5930671296,4,7,0,8,24,0,0,27,4,"4",1.63636363636364,1.88888888888889 +"pkg-blahtexml",-0.8489779977,1.4826442088,-1.4663049964,"http://github.com/abhidg/pkg-blahtexml","http://github.com/abhidg/pkg-blahtexml",103.9986226852,0,1,0,0,0,0,0,0,1,"1",2,NA +"Bluebird",1.1380974193,4.2767964991,0.1562970087,"https://salsa.debian.org/desktop-themes-team/bluebird-gtk-theme","https://github.com/shimmerproject/Bluebird",2956.8580092593,3,16,0,11,26,0,0,27,2,"2",1.84210526315789,1.96296296296296 +"bmap-tools",-0.1504052056,1.1252732802,-0.4879151231,"https://salsa.debian.org/debian/bmap-tools","https://github.com/intel/bmap-tools",4042.2103240741,15,24,3,22,30,0,1,40,3,"3",1.61538461538462,1.75 +"boinctui",-0.1432413703,1.420786312,-0.5512115785,"https://github.com/suleman1971/boinctui","https://github.com/suleman1971/boinctui",3939.3302893519,1,7,0,5,21,0,0,21,3,"3",1.875,2 +"bootinfoscript",-0.3809313102,1.1240423783,-0.7082417318,"https://salsa.debian.org/debian/boot-info-script","https://github.com/arvidjaar/bootinfoscript",3172.7375,1,7,0,3,19,0,0,20,2,"2",1.875,1.95 +"booth",-2.5882433407,-1.3768010854,-2.9582924151,"https://salsa.debian.org/ha-team/booth","https://github.com/ClusterLabs/booth.git",4438.4447337963,6,37,0,22,34,0,0,41,3,"3",1.86046511627907,1.82926829268293 +"btchip-python",-1.1812672757,1.4023375583,-1.7414921007,"https://salsa.debian.org/python-team/packages/btchip-python","https://github.com/LedgerHQ/btchip-python.git",3019.8821180556,5,10,0,10,36,0,0,36,2,"2",1.66666666666667,2 +"btfs",-0.1692325715,2.6773757299,-0.8903422829,"https://salsa.debian.org/debian/btfs","https://github.com/johang/btfs",2774.3356481482,11,11,0,15,32,0,0,39,2,"2",1.5,1.82051282051282 +"bti",-0.2588997909,0.7195438277,-0.7283552221,"https://git.toastfreeware.priv.at/debian/bti.git","https://github.com/gregkh/bti.git",3076.6664699074,14,25,0,25,36,0,0,45,2,"2",1.64102564102564,1.8 +"btrbk-packaging",0.1156617148,2.2848637542,-0.5286650377,"https://github.com/digint/btrbk-packaging","https://github.com/digint/btrbk-packaging",2807.8996064815,1,3,0,1,4,0,0,4,2,"2",1.75,2 +"compsize",0.1058240849,2.8049694932,-0.4831458072,"https://github.com/kilobyte/compsize/tree/debian","https://github.com/kilobyte/compsize",1814.0231481482,0,8,0,7,52,0,0,52,1,"1",2,2 +"budgie-desktop",-0.3863909585,-0.1050655044,-0.4722349352,"https://github.com/ubuntubudgie/budgie-desktop/tree/debian","https://github.com/ubuntubudgie/budgie-desktop",3652.4221643519,35,69,1,5,47,0,0,48,2,"2",1.66346153846154,1.97916666666667 +"budgie-extras",-0.3549864205,1.918871211,-0.8848111475,"https://github.com/UbuntuBudgie/budgie-extras/tree/debian","https://github.com/UbuntuBudgie/budgie-extras",2299.353599537,13,15,6,20,6,0,0,24,1,"1",1.53571428571429,1.25 +"budgie-indicator-applet",-0.3165710056,1.8644335276,-0.7715039703,"https://github.com/UbuntuBudgie/budgie-indicator-applet/tree/debian","https://github.com/UbuntuBudgie/budgie-indicator-applet",2410.5153935185,0,6,1,2,24,0,0,24,1,"1",2,2 +"buildapp",-0.6306447633,1.6220492356,-1.3420391452,"https://salsa.debian.org/common-lisp-team/buildapp","https://github.com/xach/buildapp",2095.158275463,0,6,0,6,25,0,0,25,1,"1",2,2 +"bwm-ng",1.4012192264,3.1707005611,0.5566987616,"https://salsa.debian.org/debian/bwm-ng","https://github.com/vgropp/bwm-ng",5022.6577083333,1,12,0,7,29,0,0,30,4,"4",1.92307692307692,1.96666666666667 +"cafeobj",-1.8104313277,-1.0153734132,-2.0497300294,"https://github.com/CafeOBJ/cafeobj","https://github.com/CafeOBJ/cafeobj",3212.0939699074,0,7,0,3,3,0,2,7,2,"2",2,1.42857142857143 +"capnproto-debian",0.2688312178,0.9760274096,-0.0981830892,"https://github.com/thomaslee/capnproto-debian","https://github.com/thomaslee/capnproto-debian",3752.338587963,3,4,0,3,5,0,0,5,2,"2",1.57142857142857,2 +"carbon-c-relay",-1.7206703797,2.1186998142,-2.7912817518,"https://salsa.debian.org/debian/carbon-c-relay","https://github.com/grobian/carbon-c-relay.git",3376.0489467593,8,36,0,25,0,0,1,26,2,"2",1.81818181818182,1 +"CARE-debian",-0.2836237154,3.5038071749,-1.3460010784,"https://github.com/ivoire/CARE-debian","https://github.com/ivoire/CARE-debian",2.7190856481,0,2,0,1,1,0,0,2,1,"1",2,1.5 +"observatories-table",-0.1932098569,1.2412651155,-0.4565906785,"https://salsa.debian.org/debian-astro-team/casacore-data-observatories","https://github.com/casacore/observatories-table.git",766.9570138889,1,3,0,2,2,0,0,2,1,"1",1.75,2 +"cassbeam",-0.2590451087,0.999251768,-0.6449745997,"https://salsa.debian.org/debian-astro-team/cassbeam","https://github.com/ratt-ru/cassbeam",1099.9010185185,0,5,0,3,3,0,0,3,1,"1",2,2 +"casync",-1.0162004091,-0.313916552,-1.2265268627,"https://salsa.debian.org/systemd-team/casync","https://github.com/systemd/casync",2466.7584606482,38,15,0,44,38,0,0,69,1,"1",1.28301886792453,1.55072463768116 +"catcodec",-1.1685609799,1.0772762213,-1.6183880518,"https://salsa.debian.org/openttd-team/catcodec","https://github.com/OpenTTD/catcodec.git",4292.8177314815,2,4,0,3,2,0,0,3,3,"3",1.66666666666667,1.66666666666667 +"catimg",-0.0953582269,2.1605928046,-0.6844708001,"https://salsa.debian.org/debian/catimg","https://github.com/posva/catimg.git",3000.6790046296,7,14,0,12,58,0,0,58,2,"2",1.66666666666667,2 +"caveexpress",-0.4341110971,0.5694718441,-0.5965828946,"https://salsa.debian.org/games-team/caveexpress","https://github.com/mgerhardy/caveexpress",2582.468125,2,6,0,4,11,0,3,14,1,"1",1.75,1.78571428571429 +"Cavez-of-Phear-packaging",0.0722256397,3.4094980689,-0.7199285527,"https://github.com/haakonnessjoen/Cavez-of-Phear-packaging","https://github.com/haakonnessjoen/Cavez-of-Phear-packaging",23.0470601852,0,1,0,1,1,0,0,2,1,"1",2,1.5 +"cbatticon",-0.6634198756,2.0334034925,-1.2638833309,"https://salsa.debian.org/debian/cbatticon","https://github.com/valr/cbatticon.git",4175.7122800926,3,25,0,19,61,0,2,63,3,"3",1.89285714285714,1.96825396825397 +"cbflib",0.9354285947,4.3539203092,-0.1929526206,"https://salsa.debian.org/science-team/cbflib","https://github.com/yayahjb/cbflib",5636.0790740741,1,18,0,8,16,0,0,18,4,"4",1.94736842105263,1.88888888888889 +"cbm",0.2175441651,1.9827159385,-0.3872945166,"https://salsa.debian.org/debian/cbm","https://github.com/resurrecting-open-source-projects/cbm",918.9922337963,1,3,0,2,11,0,0,12,1,"1",1.75,1.91666666666667 +"ccbuild",-0.9629469603,0.1146367137,-1.3836463029,"https://salsa.debian.org/debian/ccbuild","https://github.com/bneijt/ccbuild.git",4764.8878703704,1,5,0,2,9,0,0,9,3,"3",1.83333333333333,2 +"cccc",1.1630655625,3.7723724067,0.0933849486,"https://salsa.debian.org/debian/cccc","https://github.com/sarnold/cccc",2703.0782638889,1,7,0,3,10,0,0,11,1,"1",1.875,1.90909090909091 +"ccd2iso-debian",0.361667663,2.3145122267,-0.2829342926,"https://github.com/paulproteus/ccd2iso-debian","https://github.com/paulproteus/ccd2iso-debian",10.0830555556,1,1,0,2,1,0,0,3,1,"1",1.5,1.33333333333333 +"cclive",0.3075023734,1.0246036879,-0.0680117934,"https://github.com/mogaal/cclive","https://github.com/mogaal/cclive",1632.909375,1,4,0,2,0,0,0,2,1,"1",1.8,1 +"cd-discid",0.6925316992,3.3171474044,-0.0825478541,"https://github.com/taem/cd-discid/tree/deb","https://github.com/taem/cd-discid",2591.0086574074,2,2,0,3,8,0,0,9,1,"1",1.5,1.88888888888889 +"cellwriter",1.0089121851,3.1682961137,-0.0123490019,"https://salsa.debian.org/debian/cellwriter","https://github.com/risujin/cellwriter",1174.0054050926,1,2,0,2,8,0,1,9,1,"1",1.66666666666667,1.88888888888889 +"cen64-debian",-0.0299112832,2.2614422439,-0.6566748344,"https://github.com/dh4/cen64-debian/","https://github.com/dh4/cen64-debian",1926.2346064815,0,5,0,3,1,0,0,3,1,"1",2,1.33333333333333 +"cen64-qt-debian",-0.752499837,1.4603763669,-1.3157313926,"https://github.com/dh4/cen64-qt-debian/","https://github.com/dh4/cen64-qt-debian",1637.4857986111,0,4,0,3,1,0,0,3,1,"1",2,1.33333333333333 +"centreon-clib",-3.2868334023,-0.8614963308,-3.7498045046,"https://salsa.debian.org/centreon-team/centreon-clib","https://github.com/centreon/centreon-clib.git",4179.8511458333,9,17,0,12,14,0,0,16,3,"3",1.65384615384615,1.875 +"certspotter",-1.0333689914,-0.0755768851,-1.2332167803,"https://salsa.debian.org/go-team/packages/certspotter","https://github.com/sslmate/certspotter",2838.7901736111,7,8,2,11,9,0,0,16,2,"2",1.53333333333333,1.5625 +"CeWL",-0.0142294382,1.8140197076,-0.3642449144,"https://salsa.debian.org/pkg-security-team/cewl","https://github.com/digininja/CeWL.git",2751.2389351852,7,13,0,13,22,0,0,31,2,"2",1.65,1.70967741935484 +"cgroupfs-mount",0.5950079509,2.246233345,0.0389645239,"https://github.com/tianon/cgroupfs-mount","https://github.com/tianon/cgroupfs-mount",2931.2437847222,0,7,0,5,13,0,0,15,2,"2",2,1.86666666666667 +"chafa",0.2729454746,2.5277999875,-0.1637443656,"https://salsa.debian.org/debian/chafa","https://github.com/hpjansson/chafa.git",2095.0478819445,25,6,0,27,29,0,1,49,1,"1",1.19354838709677,1.59183673469388 +"Chaosreader",0.051219731,1.9660310042,-0.36928528,"https://salsa.debian.org/pkg-security-team/chaosreader","https://github.com/brendangregg/Chaosreader",66.7731134259,0,4,0,3,13,0,0,13,1,"1",2,2 +"charls",0.0895204966,0.7433078443,-0.0746073455,"https://salsa.debian.org/med-team/charls","https://github.com/team-charls/charls.git",5412.7639236111,9,14,0,14,20,0,2,29,4,"4",1.60869565217391,1.68965517241379 +"cjk",0.9697104519,1.6795645993,0.5078842706,"https://github.com/debian-tex/cjk","https://github.com/debian-tex/cjk",4969.9469328704,1,7,0,4,2,0,0,4,3,"3",1.875,1.5 +"cjose",0.2954038942,3.3240815436,-0.6206035693,"https://salsa.debian.org/debian/cjose","https://github.com/zmartzone/cjose.git",2698.734525463,9,16,0,16,4,0,0,17,1,"1",1.64,1.23529411764706 +"cjs",0.3334254948,1.2158627921,-0.0031931609,"https://salsa.debian.org/cinnamon-team/cjs","https://github.com/linuxmint/cjs.git",3771.5652546296,71,77,0,93,33,0,0,114,3,"3",1.52027027027027,1.28947368421053 +"ckbuilder",-1.3486815873,1.7603160909,-2.1472801921,"https://salsa.debian.org/js-team/ckbuilder","https://github.com/ckeditor/ckbuilder.git",3366.2307291667,1,11,0,10,31,0,0,31,2,"2",1.91666666666667,2 +"cl-csv",-0.1843136147,2.282501642,-0.9607356223,"https://salsa.debian.org/common-lisp-team/cl-csv","https://github.com/AccelerationNet/cl-csv",3373.8361342593,0,10,0,9,30,0,0,30,2,"2",2,2 +"cl-ftp",-0.6205750271,2.0407172858,-1.4348634933,"https://github.com/pinterface/cl-ftp","https://github.com/pinterface/cl-ftp",3252.9678009259,1,3,0,2,5,0,0,6,2,"2",1.75,1.83333333333333 +"cl-github-v3",-0.5258867542,3.1486982913,-1.5778685827,"https://github.com/hanshuebner/cl-github-v3","https://github.com/hanshuebner/cl-github-v3",2986.6350810185,1,3,0,2,3,0,0,3,2,"2",1.75,2 +"ironclad",-0.2926194741,2.5462973619,-0.9228966528,"https://salsa.debian.org/common-lisp-team/cl-ironclad","https://github.com/sharplispers/ironclad",5005.7061458333,20,31,0,38,63,0,0,79,4,"4",1.6078431372549,1.79746835443038 +"local-time",-0.1155735019,3.1988484402,-1.0582604602,"http://github.com/dlowe-net/local-time","http://github.com/dlowe-net/local-time",5698.7149884259,7,50,0,0,0,0,0,0,4,"4",1.87719298245614,NA +"lparallel",-0.3212127102,2.5346068068,-1.0978335516,"https://github.com/lmj/lparallel","https://github.com/lmj/lparallel",2019.918599537,0,5,0,4,49,0,0,49,1,"1",2,2 +"cl-markdown",-0.704735028,1.4518477641,-1.1406727407,"https://github.com/gwkkwg/cl-markdown","https://github.com/gwkkwg/cl-markdown",5675.8904513889,2,4,0,3,15,0,0,16,4,"4",1.66666666666667,1.9375 +"debian-coinor-ipopt",0.5832138621,1.8467840552,-0.023431241,"https://github.com/ghorn/debian-coinor-ipopt.git","https://github.com/ghorn/debian-coinor-ipopt.git",39.8457986111,1,2,0,3,6,0,0,7,1,"1",1.66666666666667,1.85714285714286 +"coinst",-2.1191156396,-0.1758133987,-2.7007167402,"https://salsa.debian.org/ocaml-team/coinst","https://github.com/vouillon/coinst",2037.998599537,0,10,0,3,4,0,0,5,1,"1",2,1.8 +"CoinUtils",0.5173058529,1.7235167137,0.083670866,"https://salsa.debian.org/science-team/coinutils","https://github.com/coin-or/CoinUtils",5778.8880671296,5,20,0,19,32,0,0,42,4,"4",1.8,1.76190476190476 +"collada-dom",0.691454203,3.6624920638,-0.1343215008,"https://salsa.debian.org/science-team/collada-dom","https://github.com/rdiankov/collada-dom",2502.5084606482,0,12,0,6,37,0,0,37,1,"1",2,2 +"colord-gtk",0.7697552931,2.9826639125,0.077041879,"https://salsa.debian.org/debian/colord-gtk","https://github.com/hughsie/colord-gtk.git",4151.4261111111,7,4,0,8,20,0,0,21,3,"3",1.36363636363636,1.95238095238095 +"Colormake",0.4957489072,1.6979687579,-0.1003336178,"https://salsa.debian.org/debian/colormake","https://github.com/pagekite/Colormake",1830.1740162037,0,12,0,7,19,0,0,20,1,"1",2,1.95 +"colorspacious",-0.5821614466,2.0041319598,-1.1596382365,"https://salsa.debian.org/python-team/packages/colorspacious","https://github.com/njsmith/colorspacious.git",1894.8289351852,2,10,0,9,30,0,0,33,1,"1",1.83333333333333,1.90909090909091 +"terminal-colors",-0.3857845184,0.9188572345,-0.8063133571,"https://salsa.debian.org/python-team/packages/colortest-python","https://github.com/eikenb/terminal-colors",4692.3352777778,1,2,0,2,11,0,0,11,3,"3",1.66666666666667,2 +"ColPack",0.2017867043,1.9302260292,-0.3695903388,"https://salsa.debian.org/science-team/colpack","https://github.com/CSCsw/ColPack",1916.7757175926,1,22,0,9,0,0,0,9,1,"1",1.95652173913043,1 +"CommonMark-py",-0.1141650084,1.2511686194,-0.3702327483,"https://salsa.debian.org/python-team/packages/commonmark-bkrs","https://github.com/rolandshoemaker/CommonMark-py",472.4580902778,0,5,0,4,23,0,0,24,1,"1",2,1.95833333333333 +"concordance",-0.4625050573,0.3139503984,-0.7573354842,"https://salsa.debian.org/debian/concordance","https://github.com/jaymzh/concordance.git",5701.1186458333,1,3,0,2,16,0,0,16,4,"4",1.75,2 +"config-package-dev",-0.2056225256,1.2522724234,-0.6633860362,"https://github.com/sipb/config-package-dev","https://github.com/sipb/config-package-dev",3585.0969444445,4,6,0,9,9,0,0,16,2,"2",1.6,1.5625 +"ssh-connect",0.6639299634,3.4943269761,-0.2623886668,"https://salsa.debian.org/debian/connect-proxy","https://github.com/gotoh/ssh-connect",3911.0326273148,0,6,0,3,7,0,0,9,3,"3",2,1.77777777777778 +"workbench",0.0811043258,2.6788022329,-0.7528644786,"http://github.com/neurodebian/workbench","http://github.com/neurodebian/workbench",3495.7424652778,3,16,0,0,0,0,0,0,2,"2",1.84210526315789,NA +"conserver",-0.5522688783,0.0570588023,-0.8821891544,"https://salsa.debian.org/debian/conserver","https://github.com/conserver/conserver.git",4671.668912037,1,15,0,9,21,0,0,23,3,"3",1.9375,1.91304347826087 +"constantly",0.8509284475,3.7618528736,0.0151388634,"https://salsa.debian.org/python-team/packages/constantly","https://github.com/twisted/constantly.git",2708.6915162037,2,14,0,8,30,0,0,30,1,"1",1.875,2 +"context",0.3449326884,0.8438807473,0.0662940568,"https://github.com/debian-tex/context","https://github.com/debian-tex/context",5666.6297800926,2,10,0,4,3,0,0,4,4,"4",1.83333333333333,1.75 +"context-modules",0.2805651463,2.5200169996,-0.1441758839,"https://github.com/debian-tex/context-modules","https://github.com/debian-tex/context-modules",4444.3460763889,3,7,0,4,3,0,0,4,3,"3",1.7,1.75 +"context-free",-0.3442355768,0.7562945788,-0.8321584754,"https://github.com/MtnViewJohn/context-free","https://github.com/MtnViewJohn/context-free",2911.319537037,1,9,0,3,27,0,9,36,2,"2",1.9,1.75 +"ConvertAll",0.1771895993,1.8709004223,-0.3855879122,"https://salsa.debian.org/qt-kde-team/extras/convertall","https://github.com/doug-101/ConvertAll.git",72.0215277778,1,2,0,1,0,0,0,1,1,"1",1.66666666666667,1 +"convertdate",-1.0779704926,1.5263503581,-1.6372696683,"https://salsa.debian.org/python-team/packages/convertdate","https://github.com/fitnr/convertdate",2873.5651041667,10,11,0,11,44,0,0,45,2,"2",1.52380952380952,1.97777777777778 +"project--copyright-update",-0.5521971605,1.8066389929,-1.1431761187,"https://salsa.debian.org/debian/copyright-update","https://github.com/jaalto/project--copyright-update",3367.8622453704,0,1,0,1,0,0,0,1,2,"2",2,1 +"core.cache",-0.5610215639,2.4088514058,-1.3030738883,"https://salsa.debian.org/clojure-team/core-cache-clojure","https://github.com/clojure/core.cache",4284.5170138889,8,15,0,13,17,0,18,44,3,"3",1.65217391304348,1.38636363636364 +"cruft",1.801661645,2.7360925805,1.1501879975,"https://github.com/a-detiste/cruft","https://github.com/a-detiste/cruft",5211.5065740741,2,8,0,7,3,0,0,7,4,"4",1.8,1.42857142857143 +"cruft-ng",0.142059124,2.3097088035,-0.5171739502,"https://github.com/a-detiste/cruft-ng","https://github.com/a-detiste/cruft-ng",3368.4031018519,2,10,0,10,11,0,1,13,2,"2",1.83333333333333,1.84615384615385 +"cryfs",-0.1323512993,0.8693806221,-0.3694530273,"https://github.com/davesteele/cryfs","https://github.com/davesteele/cryfs",3180.9594560185,28,15,0,27,1,0,0,27,2,"2",1.34883720930233,1.03703703703704 +"CTDConverter",-2.8525515304,-0.4549866674,-3.3207596251,"https://salsa.debian.org/med-team/ctdconverter","https://github.com/WorkflowConversion/CTDConverter",2616.9146180556,5,13,0,9,15,0,0,15,1,"1",1.72222222222222,2 +"cupt",-0.7851662489,-0.7413560004,-0.8102098137,"https://github.com/jackyf/cupt/tree/master","https://github.com/jackyf/cupt",3964.469525463,4,7,0,6,9,0,1,14,3,"3",1.63636363636364,1.64285714285714 +"curvedns",-1.1461706987,0.1127414426,-1.3738129892,"https://salsa.debian.org/pkg-security-team/curvedns","https://github.com/curvedns/curvedns.git",3466.7757291667,0,3,0,2,9,0,0,9,2,"2",2,2 +"cwm",-0.5002044281,1.5042184567,-0.9352825389,"https://github.com/jamesmcdonald/cwm","https://github.com/jamesmcdonald/cwm",5679.8960532407,1,30,0,0,1,0,0,1,4,"4",1.96774193548387,2 +"cycle",-0.313126049,0.6954651903,-0.7844178818,"https://salsa.debian.org/med-team/cycle","https://github.com/metlov/cycle.git",229.9525347222,0,1,0,1,0,0,0,1,1,"1",2,1 +"project--perl-ddir",-0.9126372061,1.4246841106,-1.4714839475,"https://salsa.debian.org/debian/ddir","https://github.com/jaalto/project--perl-ddir.git",3338.2834722222,0,1,0,1,2,0,0,2,2,"2",2,2 +"debomatic",-0.8158097197,-0.1371156791,-1.0821998073,"https://salsa.debian.org/python-team/packages/debomatic","https://github.com/debomatic/debomatic",5739.495,4,16,0,13,18,0,0,22,4,"4",1.8,1.81818181818182 +"debootstick",-0.5087170385,0.8382307544,-0.8815589055,"https://github.com/drakkar-lig/debootstick","https://github.com/drakkar-lig/debootstick",3036.0772106482,5,8,0,8,20,0,2,23,2,"2",1.61538461538462,1.8695652173913 +"debian-debuerreotype",-1.063173434,1.4648781183,-1.6297873496,"https://github.com/debuerreotype/debian-debuerreotype","https://github.com/debuerreotype/debian-debuerreotype",2712.8558217593,0,4,0,2,2,0,0,3,1,"1",2,1.66666666666667 +"deepin-notifications",0.3474442725,3.6547785603,-0.4321808993,"https://salsa.debian.org/pkg-deepin-team/deepin-notifications","https://github.com/linuxdeepin/deepin-notifications",2025.0469791667,4,26,0,14,18,0,0,30,1,"1",1.86666666666667,1.6 +"dicteval",-2.9536986334,-0.1320875709,-3.6889555809,"https://salsa.debian.org/debian/dicteval","https://github.com/osantana/dicteval.git",1110.6433217593,3,12,0,10,14,0,0,14,1,"1",1.8,2 +"ding-libs",0.3833422556,2.4936424716,-0.1381470129,"https://salsa.debian.org/sssd-team/ding-libs","https://github.com/SSSD/ding-libs",5249.6200810185,15,12,0,14,16,0,0,23,4,"4",1.44444444444444,1.69565217391304 +"dir2ogg",0.2396946845,1.641521491,-0.3190929184,"https://github.com/julian-klode/dir2ogg","https://github.com/julian-klode/dir2ogg",1310.0299884259,1,5,1,3,9,0,0,10,1,"1",1.83333333333333,1.9 +"direnv-deb",-0.006884838,1.7585706473,-0.4511605857,"https://github.com/direnv/direnv-deb","https://github.com/direnv/direnv-deb",3256.5212847222,1,6,0,1,1,0,0,2,2,"2",1.85714285714286,1.5 +"node-dirty",-0.8909885733,2.6227016495,-1.9512157567,"https://salsa.debian.org/js-team/dirty.js","https://github.com/felixge/node-dirty.git",4940.3282175926,7,21,0,20,52,0,0,53,3,"3",1.75,1.9811320754717 +"discus",1.1705020939,3.7454601144,0.0821077036,"https://salsa.debian.org/debian/discus","https://github.com/ncarrier/discus.git",1119.0192592593,0,4,0,1,3,0,0,3,1,"1",2,2 +"diskscan",-0.2808442196,0.3836383801,-0.4193484695,"https://salsa.debian.org/debian/diskscan","https://github.com/baruch/diskscan.git",1436.448587963,0,3,0,3,32,0,0,32,1,"1",2,2 +"ditaa",1.1445611741,3.5538586753,0.1428331298,"https://salsa.debian.org/java-team/ditaa","https://github.com/stathissideris/ditaa",4647.8960416667,3,17,0,12,73,0,0,74,3,"3",1.85,1.98648648648649 +"dizzy",0.5207937556,2.8020455015,-0.2161435151,"https://salsa.debian.org/perl-team/modules/packages/dizzy","https://github.com/penma/dizzy.git",1717.3470949074,4,6,0,4,1,0,0,5,1,"1",1.6,1.2 +"django-bitfield",-1.1647703491,1.6767739512,-1.9098342392,"https://salsa.debian.org/python-team/packages/django-bitfield","https://github.com/disqus/django-bitfield",4482.6217939815,15,33,0,35,84,0,0,98,3,"3",1.6875,1.85714285714286 +"django-cas-server",-1.308896058,2.2292815551,-2.3158506417,"https://salsa.debian.org/python-team/packages/django-cas-server","https://github.com/nitmir/django-cas-server.git",3041.6335532407,8,9,0,13,46,0,0,47,2,"2",1.52941176470588,1.97872340425532 +"pkg-django-compat",-1.3241602951,-0.1886083427,-1.7657341927,"https://github.com/Linaro/pkg-django-compat.git","https://github.com/Linaro/pkg-django-compat.git",1206.0878819445,0,6,0,3,3,0,0,3,1,"1",2,2 +"django-cors-headers",-1.1139410876,0.0671040287,-1.3367389103,"https://salsa.debian.org/python-team/packages/django-cors-headers","https://github.com/adamchainz/django-cors-headers",3979.5858333333,47,28,0,63,10,0,0,66,3,"3",1.37333333333333,1.15151515151515 +"django-guardian",-0.6318405623,-0.1756665381,-0.763973424,"https://salsa.debian.org/python-team/packages/django-guardian","https://github.com/lukaszb/django-guardian",4311.9324074074,74,100,0,127,8,0,0,133,3,"3",1.57471264367816,1.06015037593985 +"pkg-django-restricted-resource",-1.2869731875,0.2279132109,-1.7519542903,"https://github.com/Linaro/pkg-django-restricted-resource","https://github.com/Linaro/pkg-django-restricted-resource",3194.8619212963,0,7,0,4,3,0,0,5,2,"2",2,1.6 +"django-reversion",-0.777150964,0.9983388355,-1.4152875579,"https://salsa.debian.org/python-team/packages/django-reversion","https://github.com/etianen/django-reversion.git",5522.8556828704,31,173,0,144,17,0,14,167,4,"4",1.84803921568627,1.10179640718563 +"django-setuptest",-1.0039883027,1.8917399808,-1.7398796439,"https://salsa.debian.org/python-team/packages/django-setuptest","https://github.com/praekelt/django-setuptest.git",1589.0550810185,0,22,0,14,37,0,0,38,1,"1",2,1.97368421052632 +"pkg-django-testproject",-0.7999395109,1.6435435249,-1.4494523946,"https://github.com/Linaro/pkg-django-testproject","https://github.com/Linaro/pkg-django-testproject",3196.2780324074,0,5,0,3,4,0,0,4,2,"2",2,2 +"pkg-django-testscenarios",-1.3257146932,-0.0322578006,-1.6658090716,"https://github.com/Linaro/pkg-django-testscenarios","https://github.com/Linaro/pkg-django-testscenarios",3196.2901157408,0,7,0,4,5,0,0,5,2,"2",2,2 +"django-xmlrpc",-1.0500707985,0.6741579236,-1.5157519079,"https://salsa.debian.org/python-team/packages/django-xmlrpc","https://github.com/Fantomas42/django-xmlrpc",2632.3087384259,1,5,0,2,8,0,0,8,1,"1",1.83333333333333,2 +"dmarc-cat",-0.1483894393,3.3771756375,-1.1901233623,"https://salsa.debian.org/go-team/packages/dmarc-cat","https://github.com/keltia/dmarc-cat.git",1521.7803009259,0,4,0,3,19,0,0,19,1,"1",2,2 +"dms",-1.7923560941,0.9490139495,-3.0040589667,"https://github.com/grantma/dms","https://github.com/grantma/dms",1425.0333101852,0,7,0,1,0,0,0,1,1,"1",2,1 +"dnstap-ldns",-1.9630028548,0.4908382481,-2.5788124384,"https://salsa.debian.org/dns-team/dnstap-ldns","https://github.com/dnstap/dnstap-ldns.git",2977.0303009259,3,7,0,5,6,0,0,7,2,"2",1.7,1.85714285714286 +"dnswalk",1.9006613427,5.3064955884,0.5879892736,"https://salsa.debian.org/debian/dnswalk","https://github.com/davebarr/dnswalk.git",3790.9134837963,0,2,0,2,5,0,0,5,3,"3",2,2 +"docdiff",-0.3637756064,0.6895030349,-0.723612814,"https://salsa.debian.org/debian/docdiff","https://github.com/hisashim/docdiff",3912.6548148148,0,6,1,5,11,0,2,13,3,"3",2,1.84615384615385 +"Droopy",-0.8939869433,1.3787169177,-1.3337026104,"https://salsa.debian.org/debian/droopy","https://github.com/stackp/Droopy.git",5280.2147685185,0,7,0,4,33,0,0,33,4,"4",2,2 +"drumkv1",-0.1956463038,1.0706720909,-0.4594280916,"https://salsa.debian.org/multimedia-team/drumkv1","https://github.com/rncbc/drumkv1.git",4115.9090277778,1,13,0,4,23,0,1,24,3,"3",1.92857142857143,1.95833333333333 +"dtach",0.4720927384,2.0532258223,-0.05646356,"https://salsa.debian.org/voelkel-guest/dtach","https://github.com/crigler/dtach.git",1708.1544328704,2,2,0,3,25,0,0,26,1,"1",1.5,1.96153846153846 +"dtfabric",0.0544342308,2.3417288031,-0.4793676181,"https://salsa.debian.org/debian/dtfabric","https://github.com/libyal/dtfabric.git",2597.9576388889,0,1,0,1,6,0,1,7,1,"1",2,1.85714285714286 +"dumpet",0.8119567162,4.8329646447,-0.595687567,"https://salsa.debian.org/debian/dumpet","https://github.com/rhboot/dumpet.git",4953.9319097222,2,5,0,3,2,0,0,4,3,"3",1.71428571428571,1.5 +"dvbcut-deb",-0.140015948,0.3995494726,-0.3603098157,"https://github.com/bernhardu/dvbcut-deb","https://github.com/bernhardu/dvbcut-deb",2301.5843402778,21,3,0,13,12,0,0,21,1,"1",1.125,1.57142857142857 +"dvisvgm",0.1719982822,1.5508413641,-0.14266231,"https://github.com/debian-tex/dvisvgm","https://github.com/debian-tex/dvisvgm",1541.3238194445,1,6,0,3,2,0,0,3,1,"1",1.85714285714286,1.66666666666667 +"dymo-cups-drivers",0.1695490981,1.2653423504,-0.0340436611,"https://salsa.debian.org/printing-team/dymo-cups-drivers","https://github.com/matthiasbock/dymo-cups-drivers",4079.6409837963,4,11,0,5,30,0,0,31,3,"3",1.73333333333333,1.96774193548387 +"e2tools",-0.3154826477,0.572945917,-0.5928968266,"https://salsa.debian.org/debian/e2tools","https://github.com/e2tools/e2tools",1196.5083217593,2,6,3,6,14,0,0,16,1,"1",1.75,1.875 +"easygit",0.383586011,3.5957594474,-0.5807571227,"https://salsa.debian.org/debian/easygit","https://github.com/newren/easygit",3676.0657175926,399,15,0,318,0,0,0,318,2,"2",1.03623188405797,1 +"easyprocess",-0.5379917332,1.9459970198,-1.0219432067,"https://salsa.debian.org/python-team/packages/easyprocess","https://github.com/ponty/easyprocess.git",4652.3978009259,3,9,0,6,23,0,0,23,3,"3",1.75,2 +"ecdsautils",-0.5842189084,1.6112758398,-1.017052069,"https://salsa.debian.org/communitywlan-team/ecdsautils","https://github.com/freifunk-gluon/ecdsautils",3436.625625,1,8,0,5,0,0,0,5,2,"2",1.88888888888889,1 +"edbrowse",0.3708322115,1.5829127394,-0.1941202595,"https://salsa.debian.org/a11y-team/edbrowse","https://github.com/CMB/edbrowse.git",5783.5197453704,9,22,0,20,30,0,10,47,4,"4",1.70967741935484,1.63829787234043 +"emacs-python-environment",-0.6497796464,0.8881585898,-0.9254847969,"https://salsa.debian.org/emacsen-team/emacs-python-environment","https://github.com/tkf/emacs-python-environment.git",626.8352777778,0,3,0,3,12,0,0,12,1,"1",2,2 +"engauge_debian",0.4683184378,1.884463339,-0.1321998122,"https://github.com/winchen/engauge_debian","https://github.com/winchen/engauge_debian",3059.1429976852,0,6,0,2,1,0,0,2,2,"2",2,1.5 +"enjarify",0.4273596447,3.1508079803,-0.3690926561,"https://salsa.debian.org/android-tools-team/enjarify","https://github.com/Storyyeller/enjarify",1738.1109490741,3,12,0,10,26,0,0,30,1,"1",1.8,1.86666666666667 +"entrypoints",0.857419697,4.1047834353,0.0074721981,"https://salsa.debian.org/python-team/packages/entrypoints","https://github.com/takluyver/entrypoints",2468.1372569445,5,10,0,10,52,0,0,52,1,"1",1.66666666666667,2 +"enzyme",0.2209281122,2.7508227467,-0.5362781772,"https://salsa.debian.org/python-team/packages/enzyme","https://github.com/Diaoul/enzyme",665.1386111111,0,3,0,2,20,0,0,20,1,"1",2,2 +"epoptes",-0.5424519728,0.3737235027,-0.8396779959,"https://github.com/epoptes/epoptes","https://github.com/epoptes/epoptes",4351.4067939815,4,10,0,8,6,0,0,11,3,"3",1.71428571428571,1.54545454545455 +"epr-api",-0.1835594424,2.5490628716,-0.8931266505,"https://salsa.debian.org/debian-gis-team/epr-api","https://github.com/bcdev/epr-api",4843.1898611111,0,19,0,7,3,0,0,8,3,"3",2,1.375 +"erfa",0.2626332321,2.3178268988,-0.1835083824,"https://salsa.debian.org/debian-astro-team/erfa","https://github.com/liberfa/erfa",3687.0853240741,3,14,0,13,25,0,0,29,2,"2",1.82352941176471,1.86206896551724 +"eris",-0.632476633,0.6133940856,-1.1993507243,"https://salsa.debian.org/games-team/eris","https://github.com/worldforge/eris",5633.2405092593,2,7,0,8,6,0,0,10,4,"4",1.77777777777778,1.6 +"bear",-1.5598707008,0.7740571851,-2.0549566735,"https://salsa.debian.org/erlang-team/packages/erlang-bear","https://github.com/boundary/bear.git",985.0124652778,0,11,0,6,17,0,0,17,1,"1",2,2 +"cuttlefish",-1.1570169301,1.4079371161,-1.9722441303,"https://salsa.debian.org/erlang-team/packages/erlang-cuttlefish","https://github.com/Kyorai/cuttlefish.git",3504.2075115741,6,42,0,29,12,0,17,51,2,"2",1.875,1.23529411764706 +"getopt",-1.2464014688,1.2405525277,-1.7527351047,"https://salsa.debian.org/erlang-team/packages/erlang-getopt","https://github.com/jcomellas/getopt",5121.0564583333,4,19,0,16,31,0,0,33,4,"4",1.82608695652174,1.93939393939394 +"extrace",-0.716911996,1.6418001527,-1.2621214591,"https://salsa.debian.org/debian/extrace","https://github.com/chneukirchen/extrace",3149.892662037,4,2,0,5,5,0,0,6,2,"2",1.33333333333333,1.83333333333333 +"eyeD3-debian",1.2363220835,2.3225067373,0.5919861745,"https://github.com/gaetano-guerriero/eyeD3-debian","https://github.com/gaetano-guerriero/eyeD3-debian",2546.8571180556,1,6,0,1,2,0,0,3,1,"1",1.85714285714286,1.66666666666667 +"faac",0.4086376314,1.7882056088,-0.0272312251,"https://salsa.debian.org/multimedia-team/faac","https://github.com/knik0/faac",5409.5071180556,6,12,0,10,30,0,0,30,4,"4",1.66666666666667,2 +"faad2",1.0544175056,2.2339624185,0.4716640534,"https://salsa.debian.org/multimedia-team/faad2","https://github.com/knik0/faad2.git",5741.3708333333,16,14,0,22,44,0,0,49,4,"4",1.46666666666667,1.89795918367347 +"faba-icon-theme",0.8911212387,4.4384740676,-0.1142443813,"https://github.com/ubuntubudgie/faba-icon-theme/tree/debian","https://github.com/ubuntubudgie/faba-icon-theme",1592.9366782407,0,6,0,2,0,0,0,2,1,"1",2,1 +"fabulous",-1.9004216273,-0.0667224502,-2.4935029916,"https://salsa.debian.org/python-team/packages/fabulous","https://github.com/jart/fabulous.git",4223.1852546296,4,8,0,7,25,5,0,30,3,"3",1.66666666666667,1.83333333333333 +"fadecut",-0.6673500925,1.8538364578,-1.1385440983,"https://github.com/fadecut/fadecut/tree/debian","https://github.com/fadecut/fadecut",2792.815474537,1,14,5,2,11,0,1,12,2,"2",1.93333333333333,1.91666666666667 +"fai",-0.1410290031,-0.0834131887,-0.1875070234,"https://github.com/faiproject/fai","https://github.com/faiproject/fai",5773.004537037,75,16,0,54,6,0,0,57,4,"4",1.17582417582418,1.10526315789474 +"fakesleep",-2.4812653648,0.0741874264,-3.0028931926,"https://salsa.debian.org/python-team/packages/fakesleep","https://github.com/wearpants/fakesleep",0.0144907407,0,1,0,1,3,0,0,3,1,"1",2,2 +"fastd",0.3335142219,3.127871508,-0.5170005596,"https://salsa.debian.org/communitywlan-team/fastd","https://github.com/NeoRaider/fastd.git",4199.101087963,7,5,0,10,31,0,1,35,3,"3",1.41666666666667,1.88571428571429 +"ft2-clone",-1.4004624291,1.3055702677,-2.1338147005,"https://salsa.debian.org/multimedia-team/fasttracker2","https://github.com/8bitbubsy/ft2-clone",1461.1673958333,1,7,0,7,46,0,0,46,1,"1",1.875,2 +"fastx_toolkit",-0.3457886057,1.0929975464,-0.7809122121,"https://salsa.debian.org/med-team/fastx-toolkit","https://github.com/agordon/fastx_toolkit.git",3133.6998726852,1,6,0,3,38,0,0,39,2,"2",1.85714285714286,1.97435897435897 +"fatcat",0.4842442346,3.2701121154,-0.2692644397,"https://salsa.debian.org/pkg-security-team/fatcat","https://github.com/gregwar/fatcat",3248.5118981482,2,7,0,6,33,0,0,33,2,"2",1.77777777777778,2 +"fatresize",1.7814820731,4.9928976784,0.5330410517,"https://salsa.debian.org/parted-team/fatresize","https://github.com/ya-mouse/fatresize",2189.5325,0,6,0,4,33,0,0,33,1,"1",2,2 +"fbpager",1.5882380186,4.0001262231,0.5019616446,"https://salsa.debian.org/debian/fbpager","https://github.com/fluxbox/fbpager",37.6531828704,0,2,0,1,2,0,0,3,1,"1",2,1.66666666666667 +"fbset",1.3134317762,2.3999244161,0.6559617709,"https://github.com/sudipm-mukherjee/fbset.git","https://github.com/sudipm-mukherjee/fbset.git",5178.7434375,2,3,0,1,1,0,0,2,4,"4",1.6,1.5 +"fcgiwrap",0.3134577921,1.1712166293,-0.0802338795,"https://salsa.debian.org/debian/fcgiwrap","https://github.com/gnosek/fcgiwrap",2589.7245138889,5,10,0,10,65,0,0,68,1,"1",1.66666666666667,1.95588235294118 +"fcitx-libpinyin",1.3904314469,5.5830539288,-0.0318276844,"https://salsa.debian.org/input-method-team/fcitx-libpinyin","https://github.com/fcitx/fcitx-libpinyin",4359.6518287037,2,6,0,6,22,0,0,22,3,"3",1.75,2 +"pkg-fdm",0.3672168929,2.1938634044,-0.4626394068,"https://github.com/ft/pkg-fdm/","https://github.com/ft/pkg-fdm",5107.6653125,0,3,0,2,1,0,0,3,4,"4",2,1.33333333333333 +"fizmo-ncursesw",-0.2032604477,2.2028162183,-0.7770451436,"https://github.com/chrender/fizmo-ncursesw","https://github.com/chrender/fizmo-ncursesw",4851.4142708333,0,5,0,2,1,0,0,2,3,"3",2,1.5 +"flake8-polyfill",-0.2905096989,2.1500667272,-0.8317869422,"https://salsa.debian.org/python-team/packages/flake8-polyfill","https://github.com/PyCQA/flake8-polyfill.git",2673.1830902778,0,6,0,4,5,0,0,7,1,"1",2,1.71428571428571 +"flam3",0.7831072925,3.742743382,-0.2650609153,"https://salsa.debian.org/debian/flam3","https://github.com/scottdraves/flam3",1152.1052083333,1,7,0,3,25,0,4,29,1,"1",1.875,1.86206896551724 +"flask-jwt-simple",-3.7410042156,-1.191605345,-4.3201217059,"https://salsa.debian.org/python-team/packages/flask-jwt-simple","https://github.com/vimalloc/flask-jwt-simple.git",1518.8651041667,3,4,0,3,21,0,0,22,1,"1",1.57142857142857,1.95454545454545 +"flask-ldapconn",-1.0816817059,1.8547595955,-1.9421748383,"https://salsa.debian.org/python-team/packages/flask-ldapconn","https://github.com/rroemhild/flask-ldapconn",3190.6329976852,4,10,0,11,32,0,0,32,2,"2",1.71428571428571,2 +"flask-silk",-0.0747361696,1.0191065444,-0.3413292213,"https://salsa.debian.org/python-team/packages/flask-silk","https://github.com/sublee/flask-silk.git",2842.4741087963,0,7,0,3,4,0,0,4,2,"2",2,2 +"Junicode-font",0.9749123035,2.3528322079,0.3195301325,"https://salsa.debian.org/fonts-team/fonts-junicode","https://github.com/psb1558/Junicode-font",1677.9374305556,3,4,0,6,15,0,0,19,1,"1",1.57142857142857,1.78947368421053 +"font-abyssinica",1.1912418458,4.4703518731,0.0766166908,"https://salsa.debian.org/fonts-team/fonts-sil-abyssinica","https://github.com/silnrsi/font-abyssinica",1729.8640509259,1,8,0,7,2,0,0,7,1,"1",1.88888888888889,1.28571428571429 +"font-andika",0.226819753,1.7302356665,-0.1521199628,"https://salsa.debian.org/fonts-team/fonts-sil-andika","https://github.com/silnrsi/font-andika",2361.7046180556,0,9,0,6,6,0,0,11,1,"1",2,1.54545454545455 +"foomatic-db",1.5209798812,2.5785791995,0.8766539303,"https://salsa.debian.org/printing-team/foomatic-db","https://github.com/OpenPrinting/foomatic-db.git",5681.1902083333,5,53,0,16,22,0,0,30,4,"4",1.91379310344828,1.73333333333333 +"formiko-debian",0.1628471672,3.1297243219,-0.6061311313,"https://github.com/ondratu/formiko-debian","https://github.com/ondratu/formiko-debian",1770.974849537,2,2,0,3,3,0,0,3,1,"1",1.5,2 +"fortunes-br",0.3826030919,2.4726357351,-0.4239383871,"https://github.com/leitao/fortunes-br.git","https://github.com/leitao/fortunes-br.git",0.0056944444,0,1,0,1,0,0,0,1,1,"1",2,1 +"fortunes-mario-deb",0.2746196581,1.8773332397,-0.3193714441,"http://github.com/fike/fortunes-mario-deb","http://github.com/fike/fortunes-mario-deb",1606.775150463,3,8,0,0,0,0,0,0,1,"1",1.72727272727273,NA +"fpgatools",0.2633177336,3.6230241615,-0.6179143711,"https://github.com/Wolfgang-Spraul/fpgatools","https://github.com/Wolfgang-Spraul/fpgatools",1132.0893287037,1,6,0,5,0,0,0,5,1,"1",1.85714285714286,1 +"fqterm",-1.4778336115,-0.4100027914,-1.8864383483,"https://salsa.debian.org/chinese-team/fqterm","https://github.com/mytbk/fqterm",3515.765625,5,7,0,7,21,0,1,23,2,"2",1.58333333333333,1.91304347826087 +"FreeAlchemist",0.059449695,2.2746437451,-0.4707582387,"https://salsa.debian.org/python-team/packages/freealchemist","https://github.com/dakk/FreeAlchemist",3586.1830324074,0,3,0,1,0,0,0,1,2,"2",2,1 +"freedv-gui",-0.3213805891,1.1426935949,-0.7378333115,"https://salsa.debian.org/debian-hamradio-team/freedv","https://github.com/drowe67/freedv-gui",3043.6515972222,1,33,0,13,0,0,0,13,2,"2",1.97058823529412,1 +"freewheeling",0.5792903992,2.5071657819,-0.2534567966,"https://salsa.debian.org/multimedia-team/freewheeling","https://github.com/free-wheeling/freewheeling",5218.8730671296,1,3,0,3,28,0,2,30,4,"4",1.75,1.93333333333333 +"frozen-bubble",0.1650357772,0.4601977225,-0.0231433032,"https://salsa.debian.org/perl-team/modules/packages/frozen-bubble","https://github.com/kthakore/frozen-bubble.git",3389.417650463,4,17,0,10,23,0,0,27,2,"2",1.80952380952381,1.85185185185185 +"fyba",0.4754986254,2.6289545812,-0.0402028003,"https://salsa.debian.org/debian-gis-team/fyba","https://github.com/kartverket/fyba.git",1185.3266203704,1,10,0,5,17,0,0,17,1,"1",1.90909090909091,2 +"g2",-0.2327989276,0.4800818237,-0.5737455032,"https://salsa.debian.org/med-team/g2","https://github.com/danielrmeyer/g2",0,0,1,0,0,3,0,0,3,NA,NA,2,2 +"ganeti-os-noop",-0.2281036129,2.1546963922,-0.852366861,"https://salsa.debian.org/ganeti-team/ganeti-os-noop","https://github.com/grnet/ganeti-os-noop",677.1858449074,0,6,0,2,5,1,0,6,1,"1",2,1.83333333333333 +"ganglia-modules-linux",0.0664199188,1.2956066726,-0.272928033,"https://salsa.debian.org/debian/ganglia-modules-linux","https://github.com/ganglia/ganglia-modules-linux.git",1617.3040972222,0,6,0,3,4,0,0,4,1,"1",2,2 +"sonata",-0.5294268825,1.0612461481,-0.8314567315,"https://salsa.debian.org/science-team/gap-sonata","https://github.com/gap-packages/sonata.git",4006.9744907407,4,7,0,4,8,0,0,60,3,"3",1.63636363636364,1.13333333333333 +"toric",-0.2451456454,2.4949167647,-0.8186260968,"https://salsa.debian.org/science-team/gap-toric","https://github.com/gap-packages/toric.git",3029.62,4,5,0,5,6,0,0,7,2,"2",1.55555555555556,1.85714285714286 +"garmintools",-0.2174342508,0.5366088912,-0.517674515,"https://salsa.debian.org/debian/garmin-forerunner-tools","https://github.com/jorgesca/garmintools.git",2685.7982986111,0,5,0,3,1,0,0,4,1,"1",2,1.25 +"gatk-native-bindings",-0.1009865887,2.4624009827,-0.676296384,"https://salsa.debian.org/java-team/gatk-native-bindings","https://github.com/broadinstitute/gatk-native-bindings",505.8018981481,1,4,0,3,6,0,0,6,1,"1",1.8,2 +"gau2grid",-0.815898809,1.1342927173,-1.4069047503,"https://salsa.debian.org/debichem-team/gau2grid","https://github.com/dgasmith/gau2grid",1166.9793981482,4,10,0,8,18,0,0,18,1,"1",1.71428571428571,2 +"gconjugue",-1.193395361,0.6134141951,-1.7117987645,"https://salsa.debian.org/debian/gconjugue","https://github.com/jalvesaq/gconjugue",2752.1538888889,0,4,0,1,3,0,0,3,2,"2",2,2 +"gdnsd",-2.9678392165,-0.3979054994,-3.671905411,"https://github.com/paravoid/gdnsd","https://github.com/paravoid/gdnsd",4241.3566550926,2,11,0,9,3,0,0,11,3,"3",1.84615384615385,1.27272727272727 +"geki2",-0.2585741806,1.1302096458,-0.6025965378,"https://salsa.debian.org/games-team/geki2","https://github.com/Quipyowert2/geki2",1827.8569328704,0,3,0,1,1,0,0,1,1,"1",2,2 +"gelemental",0.1018714919,1.200080654,-0.3080550909,"https://salsa.debian.org/debichem-team/gelemental","https://github.com/ginggs/gelemental",1560.5809722222,8,4,0,9,9,0,0,12,1,"1",1.33333333333333,1.75 +"genetic",0.2707726153,2.7069673968,-0.4380759284,"https://salsa.debian.org/science-team/genetic","https://github.com/skoblov-lab/genetic",1118.9616550926,2,4,0,1,1,0,0,1,1,"1",1.66666666666667,2 +"genext2fs",-0.2882576546,0.2063423739,-0.5033680475,"https://salsa.debian.org/debian/genext2fs","https://github.com/bestouff/genext2fs",3682.2901041667,0,10,0,5,18,0,0,19,2,"2",2,1.94736842105263 +"gimp-texturize",0.1555855572,1.2662980132,-0.1945666027,"https://salsa.debian.org/debian/gimp-texturize","https://github.com/lmanul/gimp-texturize.git",3625.7350810185,1,11,0,4,8,0,0,8,2,"2",1.91666666666667,2 +"ginkgocadx",-0.2628483641,0.2619463655,-0.4738586037,"https://salsa.debian.org/med-team/ginkgocadx","https://github.com/gerddie/ginkgocadx.git",2123.8061111111,1,5,0,5,27,0,0,27,1,"1",1.83333333333333,2 +"git-lfs",0.1085080655,1.2887939983,-0.2117786782,"https://salsa.debian.org/go-team/packages/git-lfs","https://github.com/github/git-lfs.git",3479.3090162037,54,197,0,202,5,0,124,330,2,"2",1.78486055776892,1.01515151515152 +"git-remote-hg",1.3804187017,3.9090882195,0.2873521231,"https://salsa.debian.org/debian/git-remote-hg","https://github.com/mnauw/git-remote-hg/commits/master",5185.326875,55,11,0,0,0,0,0,0,4,"4",1.16666666666667,NA +"debian",-0.5135509471,0.0361166657,-0.7320665039,"https://salsa.debian.org/debian/github-backup","https://salsa.debian.org/debian/github-backup",3299.6675694445,9,13,0,0,0,0,0,2,2,"2",1.59090909090909,1 +"gitless",-1.0129472172,1.1745444276,-1.5532855313,"https://salsa.debian.org/python-team/packages/gitless","https://github.com/sdg-mit/gitless.git",1580.4098032407,8,31,0,24,19,0,0,38,1,"1",1.7948717948718,1.5 +"gitmagic",0.0058626792,1.3968023647,-0.4117773836,"https://salsa.debian.org/debian/gitmagic","https://github.com/blynn/gitmagic",4774.4399537037,12,73,0,47,40,0,3,65,3,"3",1.85882352941176,1.61538461538462 +"giza",-0.0821548044,1.7697955982,-0.4330998724,"https://salsa.debian.org/debian-astro-team/giza","https://github.com/danieljprice/giza",4755.9934837963,2,14,0,9,20,0,1,23,3,"3",1.875,1.8695652173913 +"gjots2",0.4947222776,2.209205505,-0.3492735275,"https://github.com/leggewie-DM/gjots2","https://github.com/leggewie-DM/gjots2",4231.0400231482,3,4,0,1,2,0,0,2,3,"3",1.57142857142857,2 +"gkrellm-cpufreq-debian",0.5206628103,3.0983277333,-0.2908114881,"https://github.com/glaubitz/gkrellm-cpufreq-debian","https://github.com/glaubitz/gkrellm-cpufreq-debian",3039.7838657408,1,2,0,1,3,0,0,3,2,"2",1.66666666666667,2 +"gkrelluim",-1.2524698575,0.70104569,-1.6202431051,"https://salsa.debian.org/debian/gkrelluim","https://github.com/dai-vdr/gkrelluim.git",5001.2533333333,0,1,0,0,0,0,0,0,4,"4",2,NA +"glimpse",4.8421978907,8.0624327916,3.3845931676,"https://github.com/az143/glimpse","https://github.com/az143/glimpse",3292.5989583333,0,6,0,2,2,0,0,4,2,"2",2,1.5 +"global",0.9251069439,1.8029807522,0.3956705838,"https://github.com/punitagrawal/global","https://github.com/punitagrawal/global",2253.924212963,4,4,0,5,4,0,0,6,1,"1",1.5,1.66666666666667 +"gmetric4j",-2.7598692877,-0.5906102463,-3.2950920542,"https://github.com/ganglia/gmetric4j","https://github.com/ganglia/gmetric4j",3040.7001273148,1,11,0,5,21,0,2,23,2,"2",1.91666666666667,1.91304347826087 +"gnarwl",-1.0091273178,-0.1197325367,-1.4783256893,"https://salsa.debian.org/debian/gnarwl","https://github.com/fln/gnarwl",2570.5118287037,1,9,0,5,7,0,0,8,1,"1",1.9,1.875 +"dash-to-panel",0.1124971506,2.1907441864,-0.4246734255,"https://salsa.debian.org/gnome-team/shell-extensions/gnome-shell-extension-dash-to-panel","https://github.com/home-sweet-gnome/dash-to-panel.git",2629.7539467593,40,85,0,86,104,0,2,187,1,"1",1.68,1.55614973262032 +"dash-to-dock",-0.0287596469,0.9830411728,-0.301129726,"https://salsa.debian.org/gnome-team/shell-extensions/gnome-shell-extension-dashtodock","https://github.com/micheleg/dash-to-dock.git",4172.0530092593,157,30,0,142,64,0,0,197,3,"3",1.16042780748663,1.3248730964467 +"GoldenEye",0.2914223421,3.2376647843,-0.4228022843,"https://salsa.debian.org/pkg-security-team/goldeneye","https://github.com/jseidl/GoldenEye",3012.1110532407,1,7,0,5,0,0,0,5,2,"2",1.875,1 +"apps-gorm",0.3792145956,1.5053938025,-0.0975198397,"https://salsa.debian.org/gnustep-team/gorm.app","https://github.com/gnustep/apps-gorm",5785.6866782407,3,22,0,21,13,0,0,27,4,"4",1.88,1.48148148148148 +"gosa-core",-0.3775685336,-0.2189132452,-0.4901429898,"https://salsa.debian.org/debian-edu-pkg-team/gosa","https://github.com/gosa-project/gosa-core",5676.7658217593,7,31,0,8,18,0,0,20,4,"4",1.81578947368421,1.9 +"gosa-plugins-mailaddress",-2.3383979882,0.2643568587,-2.9856475557,"https://salsa.debian.org/debian-edu-pkg-team/gosa-plugin-mailaddress","https://github.com/gosa-project/gosa-plugins-mailaddress",2274.6763657408,0,4,0,2,4,0,0,4,1,"1",2,2 +"gosa-plugins-netgroups",-0.9914007629,0.4777372444,-1.3827009663,"https://salsa.debian.org/debian-edu-pkg-team/gosa-plugin-netgroups","https://github.com/gosa-project/gosa-plugins-netgroups",1422.7270023148,0,3,0,1,2,0,0,2,1,"1",2,2 +"gosa-plugins-pwreset",-1.3598337718,0.2879233373,-1.6292931799,"https://salsa.debian.org/debian-edu-pkg-team/gosa-plugin-pwreset","https://github.com/gosa-project/gosa-plugins-pwreset",2184.168125,0,3,0,1,1,0,0,2,1,"1",2,1.5 +"linux-crypto",-2.3611563875,-0.8645584676,-2.6234146821,"https://salsa.debian.org/lumag/gost-crypto","https://github.com/GostCrypt/linux-crypto.git",1726.5372222222,2,3,0,2,3,0,0,3,1,"1",1.6,2 +"gpicview",2.0702671645,4.218597649,1.053942169,"https://salsa.debian.org/lxde-team/gpicview","https://github.com/lxde/gpicview",5713.732662037,76,42,0,59,6,0,0,60,4,"4",1.35593220338983,1.1 +"gpp",0.6295645906,3.8657120667,-0.3089812218,"https://salsa.debian.org/debian/gpp","https://github.com/logological/gpp/commits/master",5185.326875,55,11,0,0,0,0,0,0,4,"4",1.16666666666667,NA +"gpustat",-0.7414031604,1.6738603051,-1.1885003927,"https://salsa.debian.org/nvidia-team/gpustat","https://github.com/wookayin/gpustat",2769.8730787037,16,5,3,17,31,0,0,44,2,"2",1.23809523809524,1.70454545454545 +"gpyfft",-0.0412032188,3.0931064376,-0.9221041966,"https://salsa.debian.org/science-team/gpyfft","https://github.com/geggo/gpyfft",2840.7253009259,4,10,0,8,33,0,0,33,2,"2",1.71428571428571,2 +"gss-ntlmssp",-1.0758514008,0.7187446283,-1.5147853098,"https://salsa.debian.org/freeipa-team/gss-ntlmssp","https://github.com/gssapi/gss-ntlmssp",3594.9212152778,10,4,0,7,12,0,1,19,2,"2",1.28571428571429,1.63157894736842 +"gtkguitune",-0.2491277386,0.3826186785,-0.4591495452,"https://github.com/bobek/gtkguitune","https://github.com/bobek/gtkguitune",3186.2603587963,1,3,0,2,1,0,0,2,2,"2",1.75,1.5 +"gtkterm",1.6614158143,3.2236786848,0.801083568,"https://salsa.debian.org/debian/gtkterm","https://github.com/Jeija/gtkterm.git",4575.4452083333,6,17,0,14,44,0,0,46,3,"3",1.73913043478261,1.95652173913043 +"gtranscribe",-0.5259853209,1.6855244705,-0.950618829,"https://salsa.debian.org/debian/gtranscribe","https://github.com/innir/gtranscribe",3558.9036921296,0,5,1,2,14,0,0,14,2,"2",2,2 +"guake-indicator",0.2250848406,2.5013911283,-0.5378976224,"https://salsa.debian.org/debian/guake-indicator/","https://github.com/Ozzyboshi/guake-indicator",2489.1411226852,1,8,0,4,11,0,0,11,1,"1",1.88888888888889,2 +"gufw",1.8217065732,4.3624901931,0.7344598754,"https://salsa.debian.org/python-team/packages/gui-ufw","https://github.com/costales/gufw.git",1462.9175578704,0,7,0,8,66,0,0,67,1,"1",2,1.98507462686567 +"guidedog",-1.2127820662,0.0904612737,-1.6926274962,"https://github.com/antocm/guidedog/tree/debian","https://github.com/antocm/guidedog",2480.6617361111,0,5,0,2,1,0,1,4,1,"1",2,1.25 +"guile-ssh",-0.8980031766,3.1579670718,-2.0800708726,"https://salsa.debian.org/debian/guile-ssh","https://github.com/artyom-poptsov/guile-ssh.git",3867.3559837963,0,10,0,8,28,0,0,28,3,"3",2,2 +"gup",-5.1695702647,-4.4485454537,-5.4289590562,"https://github.com/rfc1036/gup","https://github.com/rfc1036/gup",3593.8147453704,0,1,0,1,0,0,0,1,2,"2",2,1 +"guzzle_sphinx_theme",-0.8704022633,0.681504729,-1.1374775257,"https://salsa.debian.org/python-team/packages/guzzle-sphinx-theme","https://github.com/guzzle/guzzle_sphinx_theme.git",2860.3134027778,3,11,0,12,42,0,0,42,2,"2",1.78571428571429,2 +"debian-gwaei",-0.2415301818,1.2081497422,-0.8722234296,"https://github.com/norbusan/debian-gwaei","https://github.com/norbusan/debian-gwaei",2765.6634375,2,2,0,2,3,0,0,3,2,"2",1.5,2 +"gwakeonlan",0.8535169941,3.0627414632,-0.0322068923,"https://salsa.debian.org/debian/gwakeonlan","https://github.com/muflone/gwakeonlan.git",4933.5151273148,2,13,0,10,35,0,0,35,3,"3",1.86666666666667,2 +"gwc",0.608752043,1.6289733041,0.0519069422,"https://salsa.debian.org/multimedia-team/gwc","https://github.com/AlisterH/gwc.git",3165.1705324074,1,5,0,3,6,0,0,7,2,"2",1.83333333333333,1.85714285714286 +"gxkb",0.3787936181,4.0698464881,-0.6334875708,"https://github.com/mati75/gxkb.git","https://github.com/mati75/gxkb.git",2732.567650463,0,4,0,2,2,0,0,3,1,"1",2,1.66666666666667 +"gxtuner",1.2625236588,4.7533829415,0.0339744566,"https://salsa.debian.org/multimedia-team/gxtuner","https://github.com/brummer10/gxtuner",1914.1892013889,3,6,0,4,9,0,0,9,1,"1",1.66666666666667,2 +"h2o",-0.7321540349,0.815719718,-1.2812732312,"https://salsa.debian.org/debian/h2o","https://github.com/h2o/h2o",4716.5859490741,44,155,4,123,17,0,22,154,3,"3",1.77889447236181,1.11038961038961 +"h5utils",-0.0466394355,0.6200500479,-0.3159473526,"https://salsa.debian.org/debian-gis-team/h5utils","https://github.com/NanoComp/h5utils.git",5379.8304166667,0,6,0,3,18,0,0,18,4,"4",2,2 +"hacktv",-2.0082673058,0.152267044,-2.4727541201,"https://salsa.debian.org/debian-hamradio-team/hacktv","https://github.com/fsphil/hacktv",2394.7430787037,3,7,0,8,43,0,0,45,1,"1",1.7,1.95555555555556 +"HandBrake",1.3904843391,2.685148707,0.6451582617,"https://salsa.debian.org/multimedia-team/handbrake","https://github.com/HandBrake/HandBrake",5786.3675231482,105,51,3,108,0,0,2,110,4,"4",1.32692307692308,1 +"hexedit",1.4888142147,3.4858685969,0.5617313768,"https://salsa.debian.org/debian/hexedit","https://github.com/pixel/hexedit.git",5414.7907060185,8,14,0,14,45,0,0,45,4,"4",1.63636363636364,2 +"hexter",0.4080603481,2.7603000142,-0.3443231764,"https://salsa.debian.org/multimedia-team/hexter","https://github.com/smbolton/hexter.git",4380.3528472222,0,6,0,5,17,0,0,17,3,"3",2,2 +"hfst-ospell",0.2591920737,1.3643095914,-0.0408851515,"https://salsa.debian.org/science-team/hfst-ospell","https://github.com/hfst/hfst-ospell.git",4745.7576967593,1,17,0,8,24,0,1,26,3,"3",1.94444444444444,1.92307692307692 +"hijra",-1.1521044725,0.9019784859,-1.9896405953,"https://salsa.debian.org/islamic-team/hijra","https://github.com/ojuba-org/hijra.git",4311.2884143519,0,8,0,4,4,0,0,6,3,"3",2,1.66666666666667 +"hinawa-utils",-1.8036430906,0.9409258571,-2.4422801802,"https://salsa.debian.org/debian/hinawa-utils/","https://github.com/takaswie/hinawa-utils.git",2264.2987962963,1,2,0,2,8,0,0,8,1,"1",1.66666666666667,2 +"hiro",-3.1230113579,-1.1402355338,-3.6931446576,"https://salsa.debian.org/python-team/packages/hiro","https://github.com/alisaifee/hiro",3329.7532638889,1,3,0,3,6,0,0,6,2,"2",1.75,2 +"hmat-oss",0.3027957485,3.0822404955,-0.6301530543,"https://salsa.debian.org/science-team/hmat-oss","https://github.com/jeromerobert/hmat-oss.git",3261.6730555556,6,19,0,14,7,0,0,16,2,"2",1.76,1.4375 +"hodie",-0.8398270988,0.8472590081,-1.2059612682,"https://salsa.debian.org/cts/hodie","https://github.com/michiexile/hodie",1318.6005671296,0,5,0,1,2,0,0,2,1,"1",2,2 +"hoel",-2.626226217,-0.6734593354,-3.0112543725,"https://salsa.debian.org/debian-iot-team/oauth2/hoel.git","https://github.com/babelouest/hoel",1340.3941203704,3,9,0,7,12,0,0,12,1,"1",1.75,2 +"html2text",1.3340380398,2.3215255445,0.7275451633,"https://salsa.debian.org/debian/html2text","https://github.com/grobian/html2text",1388.0924421296,5,7,0,7,21,0,0,23,1,"1",1.58333333333333,1.91304347826087 +"html5-parser",0.4588005785,2.4674305887,-0.084728594,"https://github.com/debian-calibre/html5-parser","https://github.com/debian-calibre/html5-parser",2309.5259259259,1,6,0,5,4,0,0,6,1,"1",1.85714285714286,1.66666666666667 +"hyphen",0.4314729534,1.6039540493,0.0503177929,"https://salsa.debian.org/libreoffice-team/hyphen","https://github.com/hunspell/hyphen.git",2824.9621875,2,9,0,6,18,0,0,19,2,"2",1.81818181818182,1.94736842105263 +"hyphen-ru",1.3639402124,5.60995268,0.0175129851,"http://github.com/Protagores/hyphen-ru","http://github.com/Protagores/hyphen-ru",3.0971875,0,1,0,0,0,0,0,0,1,"1",2,NA +"i18nspector",-0.3130156228,1.3470282705,-0.8210059464,"https://salsa.debian.org/debian/i18nspector","https://github.com/jwilk/i18nspector",3956.4540162037,0,2,0,2,6,0,0,7,3,"3",2,1.85714285714286 +"i2pd",-0.8587827802,0.1492942795,-1.1545577005,"https://salsa.debian.org/yangfl-guest/i2pd","https://github.com/PurpleI2P/i2pd",3747.1315856482,37,139,2,97,14,0,23,126,2,"2",1.78977272727273,1.11111111111111 +"i7z",0.0808738409,1.2622361789,-0.2430911659,"https://salsa.debian.org/debian/i7z","https://github.com/ajaiantilal/i7z",310.0352199074,0,7,0,3,33,0,0,35,1,"1",2,1.94285714285714 +"IanniX",-0.1880732304,2.1486905541,-0.8754662474,"https://salsa.debian.org/multimedia-team/iannix","https://github.com/buzzinglight/IanniX",4212.6902430556,7,14,0,10,41,0,3,45,3,"3",1.66666666666667,1.91111111111111 +"ibuffer-projectile",-0.7228061953,1.8154077231,-1.292148074,"https://salsa.debian.org/emacsen-team/ibuffer-projectile","https://github.com/purcell/ibuffer-projectile.git",3152.3891087963,1,7,0,7,14,0,0,14,2,"2",1.875,2 +"ice-builder-gradle-debian-packaging",-1.1849485707,0.9406079932,-1.6391429375,"https://github.com/zeroc-ice/ice-builder-gradle-debian-packaging.git","https://github.com/zeroc-ice/ice-builder-gradle-debian-packaging.git",2370.9240625,0,3,0,2,3,0,0,4,1,"1",2,1.75 +"icebreaker",0.4692256371,1.8411957204,-0.176942106,"https://salsa.debian.org/games-team/icebreaker","https://github.com/mattdm/icebreaker.git",3923.7699305556,0,5,0,4,7,0,0,7,3,"3",2,2 +"icemon",0.7030922937,3.5835100346,-0.2959059985,"https://salsa.debian.org/qt-kde-team/extras/icemon","https://github.com/icecc/icemon.git",4527.72,9,27,0,37,45,0,1,68,3,"3",1.75,1.66176470588235 +"icecream-sundae",-1.0385376489,1.8149325043,-1.7149505904,"https://salsa.debian.org/debian/icecream-sundae","https://github.com/JPEWdev/icecream-sundae",638.2833796296,3,6,0,6,16,0,0,16,1,"1",1.66666666666667,2 +"ifetch-tools",-1.7763116684,-1.4179435016,-1.8644650677,"https://github.com/unixabg/ifetch-tools","https://github.com/unixabg/ifetch-tools",5167.9663194445,0,4,0,3,2,0,0,3,4,"4",2,1.66666666666667 +"ifupdown-multi",-0.0008911093,3.5795714925,-1.035637135,"https://github.com/edmonds/ifupdown-multi","https://github.com/edmonds/ifupdown-multi",2598.1821759259,0,2,0,1,1,0,0,2,1,"1",2,1.5 +"inn",-0.504610683,-0.419983647,-0.5703395284,"https://salsa.debian.org/md/inn2","https://github.com/InterNetNews/inn.git",5725.5850115741,6,6,0,10,0,0,0,10,4,"4",1.5,1 +"iodine",-0.2722510221,-0.1412187428,-0.330852502,"https://git.toastfreeware.priv.at/debian/iodine.git/","https://github.com/yarrick/iodine.git",5593.1268634259,29,23,0,31,45,0,0,60,4,"4",1.44230769230769,1.75 +"ionit",-2.5676980502,-0.9981519368,-2.9844493768,"https://github.com/bdrung/ionit/tree/debian/unstable","https://github.com/bdrung/ionit",1307.9435069445,2,5,0,2,4,0,0,4,1,"1",1.71428571428571,2 +"ip4r",-1.4632745556,-0.4677957849,-1.7119933385,"https://salsa.debian.org/postgresql/ip4r","https://github.com/RhodiumToad/ip4r.git",3711.2765972222,1,6,0,5,22,0,0,23,2,"2",1.85714285714286,1.95652173913043 +"ipheth-debian",0.9430908027,3.7638258527,-0.137434873,"https://github.com/pmcenery/ipheth-debian","https://github.com/pmcenery/ipheth-debian",4243.6053819445,0,4,0,2,1,0,0,2,3,"3",2,1.5 +"ipmctl",-1.8038062885,-0.2344447385,-2.0696396657,"https://github.com/kilobyte/ipmctl/tree/debian","https://github.com/kilobyte/ipmctl",1854.5950810185,32,11,0,22,0,0,0,22,1,"1",1.25581395348837,1 +"ippusbxd",0.0111748533,2.660027865,-0.7220268879,"https://salsa.debian.org/printing-team/ippusbxd","https://github.com/OpenPrinting/ippusbxd",2327.0776967593,1,12,0,6,11,0,0,13,1,"1",1.92307692307692,1.84615384615385 +"iprange",0.6480375888,3.9597495364,-0.2945161283,"https://salsa.debian.org/debian/iprange","https://github.com/firehol/iprange.git",1873.7119328704,0,7,0,3,20,0,1,21,1,"1",2,1.95238095238095 +"iprutils",-1.9030231406,0.3339685092,-2.4460433686,"https://salsa.debian.org/debian/iprutils","https://github.com/bjking1/iprutils",5119.0450578704,18,20,0,15,14,0,0,22,4,"4",1.52631578947368,1.63636363636364 +"ipv6calc",0.5432988576,1.7634814459,-0.0022190697,"https://salsa.debian.org/debian/ipv6calc","https://github.com/pbiering/ipv6calc",5498.6132407407,2,10,5,7,16,0,0,19,4,"4",1.83333333333333,1.84210526315789 +"ipv6toolkit",0.1556183786,2.6785840103,-0.5536700112,"https://github.com/alvarezp/ipv6toolkit/tree/debian","https://github.com/alvarezp/ipv6toolkit",3020.5637962963,1,17,0,8,0,0,0,8,2,"2",1.94444444444444,1 +"pkg-ipvsadm",1.6190855359,2.7831585401,0.9056298919,"https://github.com/formorer/pkg-ipvsadm","https://github.com/formorer/pkg-ipvsadm",3173.692650463,1,2,0,2,3,0,0,4,2,"2",1.66666666666667,1.75 +"ipython_genutils",0.5301773312,3.2373221637,-0.0754853283,"https://salsa.debian.org/python-team/packages/ipython-genutils","https://github.com/ipython/ipython_genutils",4920.5252546296,2,28,3,27,23,0,0,43,3,"3",1.93333333333333,1.53488372093023 +"ir.lv2",0.0482033805,1.8072786295,-0.420434878,"https://salsa.debian.org/multimedia-team/ir.lv2","https://github.com/tomszilagyi/ir.lv2.git",901.6371759259,2,4,0,0,1,0,0,1,1,"1",1.66666666666667,2 +"sptable",-0.3572895376,2.8910468841,-1.1439831667,"https://salsa.debian.org/debian-astro-team/iraf-sptable","https://github.com/iraf-community/sptable",2001.9924189815,2,4,0,1,3,0,0,3,1,"1",1.66666666666667,2 +"ircmarkers",-1.4435928142,0.7583118463,-1.9125989528,"https://github.com/df7cb/ircmarkers","https://github.com/df7cb/ircmarkers",5694.8846527778,1,3,0,3,1,0,0,3,4,"4",1.75,1.33333333333333 +"jack_midi_clock",0.3118920052,2.9552674463,-0.4056573573,"https://salsa.debian.org/multimedia-team/jack-midi-clock","https://github.com/x42/jack_midi_clock",4775.6370949074,0,4,0,3,3,0,0,4,3,"3",2,1.75 +"jackson-dataformat-yaml",-0.30501226,2.808298895,-1.2455361494,"https://salsa.debian.org/java-team/jackson-dataformat-yaml","https://github.com/FasterXML/jackson-dataformat-yaml.git",2094.1709722222,1,22,0,16,0,0,4,20,1,"1",1.95652173913043,1 +"jaraco.itertools",-2.1770715585,0.4444182514,-2.9053425973,"https://salsa.debian.org/python-team/packages/jaraco.itertools","https://github.com/jaraco/jaraco.itertools.git",3229.3396990741,17,5,0,18,7,0,0,21,2,"2",1.22727272727273,1.33333333333333 +"java-atk-wrapper",0.561521277,1.2449834534,0.2042642146,"https://salsa.debian.org/a11y-team/java-atk-wrapper","https://github.com/GNOME/java-atk-wrapper",5298.5764814815,11,11,0,8,3,0,0,11,4,"4",1.5,1.27272727272727 +"JDim",-1.0625455629,0.9599464829,-1.4721593744,"https://salsa.debian.org/debian/jdim","https://github.com/JDimproved/JDim.git",5782.9914467593,2,15,0,8,9,0,0,9,4,"4",1.88235294117647,2 +"jhead",-0.1046962169,0.0128556712,-0.1619952781,"https://salsa.debian.org/reichel/jhead","https://github.com/Matthias-Wandel/jhead",974.1013078704,4,13,0,10,49,0,0,49,1,"1",1.76470588235294,2 +"jinja2-time",-0.4698555936,1.1570025567,-0.7656248707,"https://salsa.debian.org/python-team/packages/jinja2-time","https://github.com/hackebrot/jinja2-time",2112.1138657407,0,3,0,2,20,0,0,20,1,"1",2,2 +"jitterdebugger",-2.3485028902,-0.1533055837,-2.7859741296,"https://salsa.debian.org/debian/jitterdebugger","https://github.com/igaw/jitterdebugger.git",1214.2022916667,8,3,0,9,12,0,0,13,1,"1",1.27272727272727,1.92307692307692 +"jitterentropy-rngd",-1.0568983374,-0.2694182082,-1.1867836067,"https://salsa.debian.org/debian/jitterentropy-rngd","https://github.com/smuellerDD/jitterentropy-rngd",2267.9794675926,9,1,0,10,33,0,0,33,1,"1",1.1,2 +"jmxetric",-2.9017326958,-0.7363274677,-3.3243552835,"https://github.com/ganglia/jmxetric","https://github.com/ganglia/jmxetric",2292.7484027778,0,9,0,5,14,0,0,16,1,"1",2,1.875 +"jp2a",0.9044983067,3.5392448615,-0.0351520282,"https://salsa.debian.org/debian/jp2a","https://github.com/Talinx/jp2a",2190.7298032407,3,4,0,6,11,0,0,13,1,"1",1.57142857142857,1.84615384615385 +"jupyter-sphinx-theme",-0.4091049447,-0.045316663,-0.4899605303,"https://salsa.debian.org/python-team/packages/jupyter-sphinx-theme","https://github.com/jupyter/jupyter-sphinx-theme",1834.3539467593,2,32,0,24,12,0,0,30,1,"1",1.94117647058824,1.4 +"kamcli",-4.7786388825,-2.4182541708,-5.4179403291,"https://salsa.debian.org/pkg-voip-team/kamcli/","https://github.com/kamailio/kamcli",3121.9156134259,1,5,0,5,8,0,0,8,2,"2",1.83333333333333,2 +"kamerka",0.8743124322,3.7857646393,-0.1312218342,"http://github.com/dos1/kamerka","http://github.com/dos1/kamerka",2873.9879282407,7,12,1,0,0,0,0,0,2,"2",1.63157894736842,NA +"debian-karlyriceditor",-0.1145592946,2.7444681458,-1.0688808595,"https://github.com/martin-steghoefer/debian-karlyriceditor","https://github.com/martin-steghoefer/debian-karlyriceditor",1746.0329513889,1,1,0,2,0,0,0,2,1,"1",1.5,1 +"kbtin",-0.2885497121,1.2472045448,-0.639846297,"https://github.com/kilobyte/kbtin/tree/debian","https://github.com/kilobyte/kbtin",5761.0344212963,1,4,0,3,7,0,0,7,4,"4",1.8,2 +"kcemu-debian",-1.5465318214,-0.3965547601,-1.8452569055,"https://github.com/glaubitz/kcemu-debian","https://github.com/glaubitz/kcemu-debian",4222.8273842593,2,2,0,1,0,0,0,1,3,"3",1.5,1 +"kchmviewer",0.9382066218,2.3758050403,0.2613367395,"https://salsa.debian.org/qt-kde-team/extras/kchmviewer","https://github.com/gyunaev/kchmviewer",2255.6306481482,1,6,0,4,23,0,0,23,1,"1",1.85714285714286,2 +"kcmsystemd-debian",0.7599629002,3.9388494787,-0.1577270679,"https://github.com/shsorbom/kcmsystemd-debian.git","https://github.com/shsorbom/kcmsystemd-debian.git",684.1522685185,1,12,0,8,3,0,0,9,1,"1",1.92307692307692,1.33333333333333 +"keychain",1.0933393106,2.2752386059,0.4360362266,"https://salsa.debian.org/debian/keychain","https://github.com/funtoo/keychain",3125.5103356482,23,18,0,32,53,0,0,63,2,"2",1.4390243902439,1.84126984126984 +"khard",0.0842088929,2.5350536215,-0.5777839137,"https://salsa.debian.org/python-team/packages/khard","https://github.com/lucc/khard",3364.3432523148,16,20,1,32,41,0,0,63,2,"2",1.55555555555556,1.65079365079365 +"kim-api",-0.8423857472,1.4393693103,-1.2913134011,"https://salsa.debian.org/science-team/kim-api","https://github.com/openkim/kim-api",4210.4546527778,1,26,1,10,24,0,1,26,3,"3",1.96296296296296,1.92307692307692 +"kindleclip",-0.8974283368,0.9569429807,-1.3449393666,"https://github.com/gwolf/kindleclip","https://github.com/gwolf/kindleclip",1841.0025925926,0,1,0,1,7,0,0,7,1,"1",2,2 +"javadev",-0.406165741,0.7632042123,-0.7000750742,"https://salsa.debian.org/med-team/king","https://github.com/rlabduke/javadev.git",5017.5933217593,0,15,0,1,3,0,0,4,4,"4",2,1.75 +"kismet-debian",1.9335416891,2.9570779251,1.2756598324,"https://github.com/andrikos/kismet-debian","https://github.com/andrikos/kismet-debian",1415.5860300926,0,1,0,1,0,0,0,1,1,"1",2,1 +"clj-kitchensink",-0.6039126858,2.5849138336,-1.5600356447,"https://salsa.debian.org/clojure-team/kitchensink-clojure","https://github.com/puppetlabs/clj-kitchensink.git",3697.8495138889,12,47,0,34,0,0,0,34,2,"2",1.79661016949153,1 +"klatexformula_debian",-0.2602166071,0.57054691,-0.5330870672,"https://github.com/TobiasWinchen/klatexformula_debian","https://github.com/TobiasWinchen/klatexformula_debian",3554.8463541667,0,6,0,3,1,0,0,3,2,"2",2,1.33333333333333 +"debian-ksmtuned",0.6468606724,3.7904647882,-0.3169526232,"https://github.com/bzed/debian-ksmtuned","https://github.com/bzed/debian-ksmtuned",2027.7201157408,1,1,0,2,2,0,0,3,1,"1",1.5,1.66666666666667 +"kylin-burner",0.5891863927,3.7002638946,-0.3231693637,"https://github.com/ukui/kylin-burner","https://github.com/ukui/kylin-burner",1294.0143055556,2,9,0,4,7,0,0,8,1,"1",1.81818181818182,1.875 +"kylin-display-switch",-1.7366978486,1.7252586454,-2.558884793,"https://github.com/ukui/kylin-display-switch","https://github.com/ukui/kylin-display-switch",1387.1396296296,4,11,0,10,8,0,0,12,1,"1",1.73333333333333,1.66666666666667 +"lablgtk-extras",-0.8756228195,2.0634481167,-1.8186386711,"https://salsa.debian.org/ocaml-team/lablgtk-extras","https://github.com/zoggy/lablgtk-extras.git",3792.5139930556,0,3,0,1,2,0,0,2,3,"3",2,2 +"labltk",-0.1496995002,2.0785630827,-0.594072233,"https://salsa.debian.org/ocaml-team/labltk","https://github.com/garrigue/labltk.git",3339.1637268519,1,3,0,3,27,0,0,28,2,"2",1.75,1.96428571428571 +"laby",1.665594867,5.3198865227,0.3634891036,"https://salsa.debian.org/ocaml-team/laby","https://github.com/sgimenez/laby.git",2556.9824884259,11,12,0,15,44,0,7,56,1,"1",1.52173913043478,1.78571428571429 +"coffee",-0.8084062082,0.1539618161,-0.9674228878,"https://salsa.debian.org/debian/latex-coffee-stains","https://github.com/Echsecutor/coffee",1954.8484027778,1,7,0,3,2,0,0,3,1,"1",1.875,1.66666666666667 +"latexmk",2.3142169158,4.8870249679,1.1895147626,"https://github.com/debian-tex/latexmk","https://github.com/debian-tex/latexmk",1865.2669907407,3,7,0,5,3,0,0,5,1,"1",1.7,1.6 +"latexml",0.5426184631,2.9655400064,-0.3271877484,"https://github.com/debian-tex/latexml","https://github.com/debian-tex/latexml",2055.9208333333,2,6,0,4,1,0,0,4,1,"1",1.75,1.25 +"pkg-lava-tool",-1.5553171291,-0.4092627761,-1.882507141,"https://github.com/Linaro/pkg-lava-tool","https://github.com/Linaro/pkg-lava-tool",2892.9631481482,0,21,0,7,2,0,0,7,2,"2",2,1.28571428571429 +"pkg-lavapdu",-1.360190138,0.6576027042,-1.9660643803,"https://github.com/Linaro/pkg-lavapdu","https://github.com/Linaro/pkg-lavapdu",1898.0415972222,9,22,0,16,6,0,0,19,1,"1",1.70967741935484,1.31578947368421 +"lazyarray",-1.6930876257,1.5097154973,-2.5262604044,"https://salsa.debian.org/science-team/lazyarray","https://github.com/NeuralEnsemble/lazyarray",3518.1808333333,0,8,0,4,5,0,0,6,2,"2",2,1.83333333333333 +"lbzip2",0.4553413125,1.9206872689,-0.0826154573,"https://github.com/kjn/lbzip2/tree/debian","https://github.com/kjn/lbzip2",2710.187037037,0,3,0,1,4,0,1,5,1,"1",2,1.8 +"lcdf-typetools",0.5850757713,1.6610997166,0.0976153045,"https://salsa.debian.org/fonts-team/lcdf-typetools","https://github.com/kohler/lcdf-typetools.git",5649.3697337963,4,5,0,6,27,0,0,28,4,"4",1.55555555555556,1.96428571428571 +"acme-poe-knee",-1.8444968736,-0.7377441759,-2.0661466284,"https://salsa.debian.org/perl-team/modules/packages/libacme-poe-knee-perl","https://github.com/jib/acme-poe-knee.git",0,0,1,0,1,0,0,0,1,NA,NA,2,1 +"Alien-SDL",-0.0977796476,0.3529808751,-0.1969931002,"https://salsa.debian.org/perl-team/modules/packages/libalien-sdl-perl","https://github.com/PerlGameDev/Alien-SDL.git",2024.7772222222,0,15,0,7,10,0,0,12,1,"1",2,1.83333333333333 +"ambix",-0.2891761381,1.5956439603,-0.6870161119,"https://salsa.debian.org/multimedia-team/libambix","https://github.com/iem-projects/ambix.git",2332.8963194445,2,15,0,3,2,0,0,4,1,"1",1.88235294117647,1.5 +"apache-singleton",-1.4918758035,1.0630563092,-2.2427825215,"https://salsa.debian.org/perl-team/modules/packages/libapache-singleton-perl","https://github.com/mschout/apache-singleton.git",2808.9702777778,2,1,0,2,0,0,0,2,2,"2",1.33333333333333,1 +"mod_authnz_pam",-0.1714935794,2.2098425672,-0.8074827861,"https://salsa.debian.org/freeipa-team/mod-authnz-pam","https://github.com/adelton/mod_authnz_pam.git",3451.9741203704,6,1,0,5,17,0,0,18,2,"2",1.14285714285714,1.94444444444444 +"App-CPANTS-Lint",-0.2108873196,3.0022710317,-1.1931665391,"https://salsa.debian.org/perl-team/modules/packages/libapp-cpants-lint-perl","https://github.com/charsbar/App-CPANTS-Lint.git",177.5091782407,0,3,0,3,4,0,0,4,1,"1",2,2 +"p5-app-perlrdf-command-query",-2.5195716821,-0.1728085325,-3.0060090978,"https://salsa.debian.org/perl-team/modules/packages/libapp-perlrdf-command-query-perl","https://github.com/tobyink/p5-app-perlrdf-command-query",786.4794675926,0,1,0,1,1,0,0,2,1,"1",2,1.5 +"Archive-Ar",-0.7153173845,1.4218992511,-1.4262008359,"https://salsa.debian.org/perl-team/modules/packages/libarchive-ar-perl","https://github.com/jbazik/Archive-Ar.git",1734.3291435185,1,5,0,2,4,0,0,4,1,"1",1.83333333333333,2 +"libaria",-0.4287076752,2.5333867692,-1.5521033494,"https://github.com/jksrecko/libaria","https://github.com/jksrecko/libaria",1255.0196875,1,2,0,2,3,0,0,4,1,"1",1.66666666666667,1.75 +"perl-Array-Iterator",-1.1520508851,1.0062186595,-1.5899210944,"https://salsa.debian.org/perl-team/modules/packages/libarray-iterator-perl","https://github.com/perlancar/perl-Array-Iterator.git",4456.1288194445,1,16,0,6,7,0,0,8,3,"3",1.94117647058824,1.875 +"Astro-FITS-CFITSIO",-0.284600426,1.0728247575,-0.745324073,"https://salsa.debian.org/perl-team/modules/packages/libastro-fits-cfitsio-perl","https://github.com/pratzlaff/Astro-FITS-CFITSIO",41.8160185185,1,3,0,2,1,0,0,2,1,"1",1.75,1.5 +"AtomBus",-2.9184975503,-0.9823925311,-3.3182517592,"https://salsa.debian.org/perl-team/modules/packages/libatombus-perl","https://github.com/ironcamel/AtomBus.git",574.4602777778,0,2,0,2,4,0,0,4,1,"1",2,2 +"p5-atteanx-compatibility-trine",-5.221355937,-3.8031880755,-5.4863317126,"https://salsa.debian.org/perl-team/modules/packages/libatteanx-compatibility-trine-perl","https://github.com/kjetilk/p5-atteanx-compatibility-trine.git",174.8482291667,0,1,0,2,4,0,0,4,1,"1",2,2 +"atteanx-endpoint",-5.0524581401,-2.9636769875,-5.4798110024,"https://salsa.debian.org/perl-team/modules/packages/libatteanx-endpoint-perl","https://github.com/kasei/atteanx-endpoint.git",581.8788078704,0,3,0,2,1,0,0,2,1,"1",2,1.5 +"p5-atteanx-store-sparql",-3.6547632503,-1.1140927923,-4.301232368,"https://salsa.debian.org/perl-team/modules/packages/libatteanx-store-sparql-perl","https://github.com/kjetilk/p5-atteanx-store-sparql.git",1578.1186458333,1,3,0,4,5,0,0,5,1,"1",1.75,2 +"perl-Authen-Captcha",-0.8189234623,0.262039817,-1.0902527604,"https://salsa.debian.org/perl-team/modules/packages/libauthen-captcha-perl","https://github.com/lkundrak/perl-Authen-Captcha.git",604.0063194444,4,2,0,4,1,0,0,5,1,"1",1.33333333333333,1.2 +"B-Hooks-OP-Check",0.6263225059,3.4250343136,-0.0183739613,"https://salsa.debian.org/perl-team/modules/packages/libb-hooks-op-check-perl","https://github.com/karenetheridge/B-Hooks-OP-Check",4225.8527430556,1,3,0,3,0,0,0,3,3,"3",1.75,1 +"B-Hooks-Parser",-1.1725055097,-0.0976957027,-1.3418704161,"https://salsa.debian.org/perl-team/modules/packages/libb-hooks-parser-perl","https://github.com/karenetheridge/B-Hooks-Parser.git",3844.972962963,4,3,0,6,6,0,0,9,3,"3",1.42857142857143,1.66666666666667 +"b-utils",-0.2233577064,1.2899551919,-0.5541961272,"https://salsa.debian.org/perl-team/modules/packages/libb-utils-perl","https://github.com/jbenjore/b-utils.git",1697.3214351852,0,9,0,2,12,0,0,12,1,"1",2,2 +"libb2",0.4344926484,2.4059587424,-0.0945466725,"https://salsa.debian.org/debian/libb2","https://github.com/BLAKE2/libb2.git",2769.1435185185,5,14,0,15,43,0,0,44,2,"2",1.73684210526316,1.97727272727273 +"backuppc-xs",0.0682740707,4.0111217079,-0.9932975309,"https://salsa.debian.org/debian/libbackuppc-xs-perl","https://github.com/backuppc/backuppc-xs.git",1496.301400463,2,5,0,2,11,0,0,11,1,"1",1.71428571428571,2 +"libbase58",-0.3899391721,2.4680002613,-1.1487322403,"https://salsa.debian.org/debian/libbase58","https://github.com/luke-jr/libbase58",2238.1648148148,3,7,0,8,0,0,0,8,1,"1",1.7,1 +"libbde",0.3715579957,2.3531465313,-0.2679169251,"https://salsa.debian.org/pkg-security-team/libbde","https://github.com/libyal/libbde",2546.6279398148,2,1,0,3,54,0,2,56,1,"1",1.33333333333333,1.96428571428571 +"BerkeleyDB",0.094191881,0.6104187657,-0.0890236719,"https://salsa.debian.org/md/libberkeleydb-perl","https://github.com/pmqs/BerkeleyDB.git",5644.9127083333,1,4,0,3,5,0,0,5,4,"4",1.8,2 +"bio-alignio-stockholm",-4.9835930933,-2.6349248881,-5.4713428559,"https://salsa.debian.org/med-team/libbio-alignio-stockholm-perl","https://github.com/bioperl/bio-alignio-stockholm.git",10.2199305556,0,2,0,2,0,0,0,2,1,"1",2,1 +"bio-cluster",-0.7997866799,1.4401770295,-1.3214678694,"https://salsa.debian.org/med-team/libbio-cluster-perl","https://github.com/bioperl/bio-cluster.git",7.3618171296,0,2,0,2,2,0,0,3,1,"1",2,1.66666666666667 +"bio-db-embl",-3.9031050099,-1.6133202421,-4.3425936432,"https://salsa.debian.org/med-team/libbio-db-embl-perl","https://github.com/bioperl/bio-db-embl.git",156.3099421296,0,2,0,2,2,0,0,3,1,"1",2,1.66666666666667 +"bioparser",-1.0837320242,1.8160602363,-1.7618255497,"https://salsa.debian.org/med-team/libbioparser-dev","https://github.com/rvaser/bioparser",2526.0444675926,2,4,0,2,7,0,0,7,1,"1",1.66666666666667,2 +"bot-training",-3.2750745336,-1.1281011499,-3.7406250651,"https://salsa.debian.org/perl-team/modules/packages/libbot-training-perl","https://github.com/avar/bot-training.git",3166.8061805556,0,2,0,2,3,0,0,3,2,"2",2,2 +"bpp-core",-0.3055083002,1.3427773866,-0.9266820803,"https://salsa.debian.org/med-team/libbpp-core","https://github.com/BioPP/bpp-core",4797.1825925926,3,24,0,9,13,0,0,14,3,"3",1.88888888888889,1.92857142857143 +"bpp-phyl",-0.6908318666,0.5108256238,-1.0987919805,"https://salsa.debian.org/med-team/libbpp-phyl","https://github.com/BioPP/bpp-phyl.git",5775.3533796296,2,40,0,11,26,0,0,30,4,"4",1.95238095238095,1.86666666666667 +"bpp-phyl-omics",-0.3598958857,2.0635272475,-1.1073993387,"https://salsa.debian.org/med-team/libbpp-phyl-omics","https://github.com/BioPP/bpp-phyl-omics.git",4025.9415046296,0,9,0,3,3,0,0,4,3,"3",2,1.75 +"bpp-popgen",-0.5271533507,1.1251682809,-1.1042333821,"https://salsa.debian.org/med-team/libbpp-popgen","https://github.com/BioPP/bpp-popgen",5514.9573032407,1,13,0,4,2,0,0,4,4,"4",1.92857142857143,1.5 +"bpp-qt",-0.0541983729,2.8865148932,-1.0203907927,"https://salsa.debian.org/med-team/libbpp-qt","https://github.com/BioPP/bpp-qt",5024.8754050926,0,12,0,3,1,0,0,3,4,"4",2,1.33333333333333 +"bpp-raa",-0.4695334076,2.4236088145,-1.4371504644,"https://salsa.debian.org/med-team/libbpp-raa","https://github.com/BioPP/bpp-raa",5066.2362962963,0,17,0,4,1,0,0,4,4,"4",2,1.25 +"bpp-seq",-0.7192518957,0.6394875381,-1.1233907337,"https://salsa.debian.org/med-team/libbpp-seq","https://github.com/BioPP/bpp-seq",5747.7503472222,1,22,0,5,7,0,0,9,4,"4",1.95652173913043,1.77777777777778 +"bpp-seq-omics",-0.4569335369,1.1913544639,-1.0602096041,"https://salsa.debian.org/med-team/libbpp-seq-omics","https://github.com/BioPP/bpp-seq-omics.git",4806.9277083333,0,14,0,4,5,0,0,6,3,"3",2,1.83333333333333 +"bultitude",-1.4773927994,1.1163772935,-2.107348178,"https://salsa.debian.org/clojure-team/libbultitude-clojure","https://github.com/TimoFreiberg/bultitude.git",2812.2660300926,1,20,0,15,5,0,0,18,2,"2",1.95238095238095,1.27777777777778 +"Business-EDI",-3.9144500578,-1.6606272938,-4.344431509,"https://salsa.debian.org/perl-team/modules/packages/libbusiness-edi-perl","https://github.com/atz/Business-EDI.git",1031.8625925926,0,2,0,1,2,0,0,2,1,"1",2,2 +"business-isbn",0.4456335938,2.2644684353,-0.07414136,"https://salsa.debian.org/perl-team/modules/packages/libbusiness-isbn-perl","https://github.com/briandfoy/business-isbn.git",5456.629849537,2,8,0,6,17,0,0,19,4,"4",1.8,1.89473684210526 +"libcaca",1.7158261148,2.8952023479,1.0094395421,"https://salsa.debian.org/multimedia-team/libcaca","https://github.com/cacalabs/libcaca.git",5032.4727199074,5,18,0,13,72,0,0,75,4,"4",1.78260869565217,1.96 +"cache-historical-perl",-2.3954691781,0.151997288,-2.9853546683,"https://salsa.debian.org/perl-team/modules/packages/libcache-historical-perl","https://github.com/mschilli/cache-historical-perl.git",1172.6421064815,1,1,0,2,0,0,0,2,1,"1",1.5,1 +"Cache-Memcached-Fast",0.4990329576,3.9172913613,-0.4350811541,"https://salsa.debian.org/perl-team/modules/packages/libcache-memcached-fast-perl","https://github.com/JRaspass/Cache-Memcached-Fast.git",5347.5680324074,1,11,0,8,23,0,0,23,4,"4",1.91666666666667,2 +"libcap-ng",0.8396700265,1.681480669,0.3896198847,"https://salsa.debian.org/debian/libcap-ng","https://github.com/stevegrubb/libcap-ng",2330.4456365741,16,5,0,19,22,0,0,29,1,"1",1.23809523809524,1.75862068965517 +"libcapi20",0.8368813861,2.3931041059,0.2031772198,"https://github.com/leggewie-DM/libcapi20","https://github.com/leggewie-DM/libcapi20",1469.2789236111,0,1,0,1,1,0,0,2,1,"1",2,1.5 +"Catalyst-Authentication-Credential-HTTP",-0.5445869591,1.7237240173,-0.9848916986,"https://salsa.debian.org/perl-team/modules/packages/libcatalyst-authentication-credential-http-perl","https://github.com/perl-catalyst/Catalyst-Authentication-Credential-HTTP",3862.9087152778,0,7,0,7,0,0,0,7,3,"3",2,1 +"catalyst-dispatch-regex",-0.2606173856,1.8455952252,-0.6908933433,"https://salsa.debian.org/perl-team/modules/packages/libcatalyst-dispatchtype-regex-perl","https://github.com/mvgrimes/catalyst-dispatch-regex.git",733.893287037,0,2,0,2,3,0,0,3,1,"1",2,2 +"Catalyst-Model-DBIC-Schema",0.0213319889,2.940935467,-0.7164785923,"https://salsa.debian.org/perl-team/modules/packages/libcatalyst-model-dbic-schema-perl","https://github.com/perl-catalyst/Catalyst-Model-DBIC-Schema",5560.3081828704,1,18,0,13,3,0,0,16,4,"4",1.94736842105263,1.1875 +"Catmandu-Atom",-2.0448922521,-0.090192519,-2.4689508151,"https://salsa.debian.org/perl-team/modules/packages/libcatmandu-atom-perl","https://github.com/LibreCat/Catmandu-Atom.git",2313.0128472222,0,6,0,5,2,0,0,5,1,"1",2,1.4 +"Catmandu-FileStore",-4.6751603427,-1.9416786358,-5.4067542228,"https://salsa.debian.org/perl-team/modules/packages/libcatmandu-filestore-perl","https://github.com/LibreCat/Catmandu-FileStore.git",1680.9195138889,0,7,0,6,8,0,0,8,1,"1",2,2 +"Catmandu-Importer-getJSON",-1.1909213366,1.1095653007,-1.9138474886,"https://salsa.debian.org/perl-team/modules/packages/libcatmandu-importer-getjson-perl","https://github.com/nichtich/Catmandu-Importer-getJSON.git",2053.8504513889,2,5,0,5,11,0,0,12,1,"1",1.71428571428571,1.91666666666667 +"Catmandu-MAB2",-2.1995168172,-0.5970612736,-2.5957637184,"https://salsa.debian.org/perl-team/modules/packages/libcatmandu-mab2-perl","https://github.com/jorol/Catmandu-MAB2.git",2364.9603356482,0,4,0,2,7,0,0,7,1,"1",2,2 +"Catmandu-RDF",-1.5674004847,0.7873124502,-2.1156699483,"https://salsa.debian.org/perl-team/modules/packages/libcatmandu-rdf-perl","https://github.com/LibreCat/Catmandu-RDF.git",3436.1034722222,1,7,0,4,19,0,1,21,2,"2",1.875,1.9047619047619 +"Catmandu-SRU",-1.6347444625,0.7856473937,-2.213169114,"https://salsa.debian.org/perl-team/modules/packages/libcatmandu-sru-perl","https://github.com/LibreCat/Catmandu-SRU.git",3182.483275463,4,14,0,8,13,0,0,14,2,"2",1.77777777777778,1.92857142857143 +"Catmandu-Store-MongoDB",-2.1900265394,0.0427518931,-2.6176713043,"https://salsa.debian.org/perl-team/modules/packages/libcatmandu-store-mongodb-perl","https://github.com/LibreCat/Catmandu-Store-MongoDB.git",3318.0048263889,0,6,0,4,6,0,0,6,2,"2",2,2 +"Catmandu-Wikidata",-1.8751171258,0.7106805559,-2.4545693893,"https://salsa.debian.org/perl-team/modules/packages/libcatmandu-wikidata-perl","https://github.com/nichtich/Catmandu-Wikidata.git",3124.955462963,0,3,0,1,4,0,1,5,2,"2",2,1.8 +"cgi-application-server",-1.3503684925,1.1163471363,-2.0606594531,"https://salsa.debian.org/perl-team/modules/packages/libcgi-application-server-perl","https://github.com/rjbs/cgi-application-server.git",2084.0161111111,0,3,0,2,2,0,0,4,1,"1",2,1.5 +"CGI-Expand",-0.5995119077,1.6030547825,-1.0867729842,"https://salsa.debian.org/perl-team/modules/packages/libcgi-expand-perl","https://github.com/bowman/CGI-Expand.git",1724.580462963,2,5,0,2,1,0,0,2,1,"1",1.71428571428571,1.5 +"CGI-Session-ExpireSessions",-2.1411258628,-0.6175205041,-2.4722907936,"https://salsa.debian.org/perl-team/modules/packages/libcgi-session-expiresessions-perl","https://github.com/ronsavage/CGI-Session-ExpireSessions",152.6683333333,0,1,0,1,2,0,0,2,1,"1",2,2 +"Chatbot-Eliza",-1.3144935043,1.2362568323,-1.8965557655,"https://salsa.debian.org/perl-team/modules/packages/libchatbot-eliza-perl","https://github.com/ggruen/Chatbot-Eliza",2872.7296875,1,4,0,2,0,0,0,2,2,"2",1.8,1 +"chi-driver-redis",-1.0562831931,1.2500992113,-1.5273046989,"https://salsa.debian.org/perl-team/modules/packages/libchi-driver-redis-perl","https://github.com/rentrak/chi-driver-redis",2250.5063078704,1,6,0,4,5,0,0,6,1,"1",1.85714285714286,1.83333333333333 +"libcitygml",-1.0898756324,0.0704593832,-1.422660328,"https://salsa.debian.org/debian-gis-team/libcitygml","https://github.com/jklimke/libcitygml.git",4063.0042476852,3,34,0,18,41,0,0,42,3,"3",1.91891891891892,1.97619047619048 +"class-c3-adopt-next",-0.163979537,2.015060941,-0.6012557543,"https://salsa.debian.org/perl-team/modules/packages/libclass-c3-adopt-next-perl","https://github.com/rafl/class-c3-adopt-next.git",539.1778587963,0,4,0,2,0,0,0,2,1,"1",2,1 +"Class-Container",-0.0506280246,1.6643843634,-0.4036695635,"https://salsa.debian.org/perl-team/modules/packages/libclass-container-perl","https://github.com/kenahoo/Class-Container.git",1.6649189815,1,3,0,3,3,0,0,3,1,"1",1.75,2 +"class-insideout",-0.6783523447,1.0454132392,-0.9711596731,"https://salsa.debian.org/perl-team/modules/packages/libclass-insideout-perl","https://github.com/dagolden/class-insideout.git",3195.8285300926,0,3,0,2,8,0,0,8,2,"2",2,2 +"class-meta",-2.1588155835,0.1407589648,-2.6165631943,"https://salsa.debian.org/perl-team/modules/packages/libclass-meta-perl","https://github.com/theory/class-meta.git",2689.2590856482,0,3,0,2,3,0,0,3,1,"1",2,2 +"class-refresh",-1.6945342203,0.5207835259,-2.147534344,"https://salsa.debian.org/perl-team/modules/packages/libclass-refresh-perl","https://github.com/doy/class-refresh.git",1057.1042708333,0,3,0,3,6,0,0,6,1,"1",2,2 +"libcleri",-2.6428568291,0.0499127531,-3.28649977,"https://salsa.debian.org/siridb-team/libcleri","https://github.com/cesbit/libcleri.git",2711.9692592593,2,9,0,4,7,0,0,8,1,"1",1.81818181818182,1.875 +"config-auto",0.2333854777,2.0661047236,-0.2396184716,"https://salsa.debian.org/perl-team/modules/packages/libconfig-auto-perl","https://github.com/jib/config-auto.git",2192.3712731482,2,3,0,1,2,0,0,3,1,"1",1.6,1.66666666666667 +"Config-Identity",-1.1292654123,1.0457452223,-1.5624237769,"https://salsa.debian.org/perl-team/modules/packages/libconfig-identity-perl","https://github.com/dagolden/Config-Identity.git",2902.5731828704,0,4,0,3,2,0,0,4,2,"2",2,1.5 +"perl-Convert-ASN1",0.4197948981,1.947299648,-0.0317401557,"https://salsa.debian.org/perl-team/modules/packages/libconvert-asn1-perl","https://github.com/gbarr/perl-Convert-ASN1.git",5538.4047453704,6,11,0,13,39,0,0,41,4,"4",1.64705882352941,1.95121951219512 +"convert-binhex",0.5297090391,2.6158283055,-0.0231792705,"https://salsa.debian.org/perl-team/modules/packages/libconvert-binhex-perl","https://github.com/stephenenelson/convert-binhex.git",816.5657407407,0,2,0,2,2,0,0,3,1,"1",2,1.66666666666667 +"CPAN-DistnameInfo",0.2522399529,2.0212536151,-0.1714651554,"https://salsa.debian.org/perl-team/modules/packages/libcpan-distnameinfo-perl","https://github.com/gbarr/CPAN-DistnameInfo.git",2596.9826157407,4,4,0,6,11,0,0,16,1,"1",1.5,1.6875 +"perl-crypt-cracklib",-0.6543542036,2.0569886418,-1.4105292586,"https://salsa.debian.org/perl-team/modules/packages/libcrypt-cracklib-perl","https://github.com/dsully/perl-crypt-cracklib.git",1122.6671643519,0,2,0,1,5,0,0,5,1,"1",2,2 +"Crypt-DH-GMP",-0.2521104835,0.8592315725,-0.4600056877,"https://salsa.debian.org/perl-team/modules/packages/libcrypt-dh-gmp-perl","https://github.com/lestrrat/Crypt-DH-GMP.git",1507.2044791667,0,3,0,2,2,0,0,3,1,"1",2,1.66666666666667 +"crypt-dh",-0.350596725,1.4226875994,-0.742243187,"https://salsa.debian.org/perl-team/modules/packages/libcrypt-dh-perl","https://github.com/wchristian/crypt-dh.git",6.7348726852,0,3,0,2,0,0,0,2,1,"1",2,1 +"perl-Crypt-OpenSSL-Bignum",0.573671133,2.817673072,-0.0231679046,"https://salsa.debian.org/perl-team/modules/packages/libcrypt-openssl-bignum-perl","https://github.com/kmx/perl-Crypt-OpenSSL-Bignum.git",1031.4781134259,1,6,0,3,7,0,0,8,1,"1",1.85714285714286,1.875 +"perl-crypt-openssl-pkcs10",-0.3431098229,2.5077909436,-1.1135889242,"https://salsa.debian.org/perl-team/modules/packages/libcrypt-openssl-pkcs10-perl","https://github.com/perl-openssl/perl-crypt-openssl-pkcs10.git",84.9646875,1,2,0,1,1,0,0,1,1,"1",1.66666666666667,2 +"Crypt-OpenSSL-RSA",0.4685020789,2.4809174365,-0.0400198203,"https://salsa.debian.org/perl-team/modules/packages/libcrypt-openssl-rsa-perl","https://github.com/toddr/Crypt-OpenSSL-RSA.git",4592.8473842593,12,12,0,16,31,0,0,35,3,"3",1.5,1.88571428571429 +"crypt-saltedhash",-0.4905719307,1.6402467611,-0.9344153294,"https://salsa.debian.org/perl-team/modules/packages/libcrypt-saltedhash-perl","https://github.com/campus-explorer/crypt-saltedhash",137.0340162037,2,4,0,4,7,0,0,8,1,"1",1.66666666666667,1.875 +"CSS-Tiny",-0.2187157738,2.0546898664,-0.9614626512,"https://salsa.debian.org/perl-team/modules/packages/libcss-tiny-perl","https://github.com/chorny/CSS-Tiny.git",2896.0719791667,1,2,0,3,0,0,0,3,2,"2",1.66666666666667,1 +"libcue",1.3280527366,4.5646098156,0.2528534907,"https://salsa.debian.org/debian/libcue","https://github.com/lipnitsk/libcue",5295.1366435185,10,5,0,13,29,0,0,29,4,"4",1.33333333333333,2 +"libcypher-parser",-0.5122868361,1.7043358431,-0.9505714794,"https://github.com/cleishm/libcypher-parser","https://github.com/cleishm/libcypher-parser",2052.1131134259,4,8,0,4,34,0,1,35,1,"1",1.66666666666667,1.97142857142857 +"Dancer-Plugin-REST",-1.332193545,1.346725582,-1.9482623921,"https://salsa.debian.org/perl-team/modules/packages/libdancer-plugin-rest-perl","https://github.com/perldancer/Dancer-Plugin-REST.git",1451.9472800926,1,5,0,2,4,0,0,6,1,"1",1.83333333333333,1.66666666666667 +"perl-Data-Alias",0.1378605049,2.1486354011,-0.5977466385,"https://salsa.debian.org/perl-team/modules/packages/libdata-alias-perl","https://github.com/mvduin/perl-Data-Alias",610.4551041667,0,2,0,2,4,0,0,4,1,"1",2,2 +"Data-Dumper-Concise",0.2663762197,2.5519999595,-0.2144683206,"https://salsa.debian.org/perl-team/modules/packages/libdata-dumper-concise-perl","https://github.com/p5sagit/Data-Dumper-Concise",2778.0428240741,1,3,0,2,0,0,0,2,2,"2",1.75,1 +"Data-FormValidator",-0.452587545,1.1833831498,-0.804155609,"https://salsa.debian.org/perl-team/modules/packages/libdata-formvalidator-perl","https://github.com/dnmfarrell/Data-FormValidator.git",2189.7575578704,3,6,0,6,10,0,0,11,1,"1",1.66666666666667,1.90909090909091 +"data-hal",-0.7708587998,2.2387120212,-1.7298903065,"https://salsa.debian.org/perl-team/modules/packages/libdata-hal-perl","https://github.com/sipwise/data-hal.git",3620.8497222222,0,13,0,10,4,0,0,12,2,"2",2,1.33333333333333 +"Data-OptList",0.4752078978,2.7815727481,-0.0271116591,"https://salsa.debian.org/perl-team/modules/packages/libdata-optlist-perl","https://github.com/rjbs/Data-OptList.git",5253.3015972222,0,2,0,2,5,0,0,5,4,"4",2,2 +"data-phrasebook",-2.0173455185,0.5053918978,-2.598257896,"https://salsa.debian.org/perl-team/modules/packages/libdata-phrasebook-perl","https://github.com/barbie/data-phrasebook.git",3782.0208333333,0,1,0,1,0,0,0,1,3,"3",2,1 +"perl-database-dumptruck",-2.6354712016,-0.053291936,-3.2800311486,"https://salsa.debian.org/perl-team/modules/packages/libdatabase-dumptruck-perl","https://github.com/lkundrak/perl-database-dumptruck.git",85.8566550926,0,1,0,1,1,0,0,2,1,"1",2,1.5 +"DateTime-Format-Mail",0.3841471215,2.8615309864,-0.1765169258,"https://salsa.debian.org/perl-team/modules/packages/libdatetime-format-mail-perl","https://github.com/book/DateTime-Format-Mail.git",809.9546875,2,1,0,3,7,0,0,7,1,"1",1.33333333333333,2 +"DBD-ODBC",-0.4492586589,-0.3647039199,-0.4605696828,"https://salsa.debian.org/perl-team/modules/packages/libdbd-odbc-perl","https://github.com/perl5-dbi/DBD-ODBC.git",4357.0500347222,1,12,0,8,22,0,0,22,3,"3",1.92307692307692,2 +"DBD-SQLite2",-0.2242626457,0.8599429182,-0.4391897101,"https://salsa.debian.org/perl-team/modules/packages/libdbd-sqlite2-perl","https://github.com/rurban/DBD-SQLite2",1683.3107175926,3,5,0,1,0,0,0,1,1,"1",1.625,1 +"DBIx-Abstract",-0.7663996691,0.9860020058,-1.2168119968,"https://salsa.debian.org/perl-team/modules/packages/libdbix-abstract-perl","https://github.com/iarna/DBIx-Abstract.git",3028.2298842593,1,6,0,3,3,0,0,3,2,"2",1.85714285714286,2 +"dbix-class-schema-loader",0.899902187,3.2743262714,-0.0171547791,"https://salsa.debian.org/perl-team/modules/packages/libdbix-class-schema-loader-perl","https://github.com/dbsrgits/dbix-class-schema-loader",5369.7104282407,13,29,0,32,33,0,0,52,4,"4",1.69047619047619,1.63461538461538 +"Debian-Copyright",0.0036003397,1.9825965853,-0.5566012214,"https://salsa.debian.org/perl-team/modules/packages/libdebian-copyright-perl","https://github.com/periapt/Debian-Copyright.git",467.6439236111,0,1,0,1,1,0,0,2,1,"1",2,1.5 +"Devel-bt",-0.5926888766,2.1164194627,-1.6374000091,"https://salsa.debian.org/perl-team/modules/packages/libdevel-bt-perl","http://github.com/rafl/Devel-bt",563.5733796296,0,1,0,0,0,0,0,0,1,"1",2,NA +"Devel-Cycle",0.2975717055,2.3628676137,-0.1689937232,"https://salsa.debian.org/perl-team/modules/packages/libdevel-cycle-perl","https://github.com/lstein/Devel-Cycle.git",24.4394791667,1,2,0,1,0,0,0,1,1,"1",1.66666666666667,1 +"devel-symdump",0.1995761912,1.3405631393,-0.0953876401,"https://salsa.debian.org/debian/libdevel-symdump-perl","https://github.com/andk/devel-symdump",2899.582337963,0,6,0,4,4,0,0,5,2,"2",2,1.8 +"Perl-Device-Cdio",-1.3704489286,-0.772668166,-1.5698638654,"https://salsa.debian.org/perl-team/modules/packages/libdevice-cdio-perl","https://github.com/rocky/Perl-Device-Cdio.git",3711.3743287037,0,4,0,1,6,0,0,6,2,"2",2,2 +"directory-scratch",-0.3578234126,3.2936545083,-1.4107895462,"https://salsa.debian.org/perl-team/modules/packages/libdirectory-scratch-perl","https://github.com/bobtfish/directory-scratch.git",1951.3868981482,1,5,0,4,1,0,0,4,1,"1",1.83333333333333,1.25 +"p5-dist-inkt",-1.6527902396,0.7910520727,-2.1410543937,"https://salsa.debian.org/perl-team/modules/packages/libdist-inkt-perl","https://github.com/tobyink/p5-dist-inkt",2915.0334953704,0,1,0,1,4,0,0,4,2,"2",2,2 +"p5-dist-inkt-role-test",-1.5942005273,1.6783425318,-2.409860989,"https://salsa.debian.org/perl-team/modules/packages/libdist-inkt-role-test-perl","https://github.com/tobyink/p5-dist-inkt-role-test",0.0739467593,0,1,0,1,0,0,0,1,1,"1",2,1 +"dist-zilla-plugins-cjm",-0.7135120934,1.9137851349,-1.4906069541,"https://salsa.debian.org/perl-team/modules/packages/libdist-zilla-plugins-cjm-perl","https://github.com/madsen/dist-zilla-plugins-cjm",3005.9145833333,0,4,0,4,10,0,0,11,2,"2",2,1.90909090909091 +"libdivsufsort",0.3802819676,3.1639307168,-0.2503528943,"https://salsa.debian.org/med-team/libdivsufsort","https://github.com/y-256/libdivsufsort.git",2687.7754050926,0,6,0,2,28,0,0,28,1,"1",2,2 +"libdogleg",-0.2667101184,1.7245498351,-0.6711419661,"https://salsa.debian.org/science-team/libdogleg","https://github.com/dkogan/libdogleg.git",4490.860775463,0,5,0,2,1,0,0,2,3,"3",2,1.5 +"libeatmydata",0.3763000817,1.1375608394,0.0117248362,"https://salsa.debian.org/debian/libeatmydata","https://github.com/stewartsmith/libeatmydata.git",5640.2884027778,11,12,0,16,27,0,0,35,4,"4",1.52173913043478,1.77142857142857 +"Email-MIME-CreateHTML",-0.598597254,0.9396464518,-0.9866469243,"https://salsa.debian.org/perl-team/modules/packages/libemail-mime-createhtml-perl","https://github.com/vanstyn/Email-MIME-CreateHTML.git",1257.2075810185,1,3,0,3,9,0,0,10,1,"1",1.75,1.9 +"end",-1.6952231001,0.2859980609,-2.1369126329,"https://salsa.debian.org/perl-team/modules/packages/libend-perl","https://github.com/Abigail/end.git",519.9620023148,0,1,0,0,1,0,0,1,1,"1",2,2 +"libeot",0.4231617787,2.6750549846,-0.0161024184,"https://salsa.debian.org/fonts-team/libeot","https://github.com/umanwizard/libeot.git",3660.8458101852,1,5,0,4,6,0,0,9,2,"2",1.83333333333333,1.66666666666667 +"eval-closure",0.3725931069,2.6025825306,-0.0711445029,"https://salsa.debian.org/perl-team/modules/packages/libeval-closure-perl","https://github.com/doy/eval-closure.git",2047.9688310185,1,4,0,5,11,0,0,13,1,"1",1.8,1.84615384615385 +"libevt",0.3231580646,2.9388038619,-0.3464543518,"https://salsa.debian.org/pkg-security-team/libevt","https://github.com/libyal/libevt",2794.588125,1,2,0,2,3,0,2,5,2,"2",1.66666666666667,1.6 +"libevtx",0.4679040206,3.3941203575,-0.3128196542,"https://salsa.debian.org/pkg-security-team/libevtx","https://github.com/libyal/libevtx",2794.5568055556,0,1,0,1,24,0,2,26,2,"2",2,1.92307692307692 +"libeXaDrums",-1.57576575,0.4655834923,-2.0471585802,"https://github.com/SpintroniK/libeXaDrums/tree/debian","https://github.com/SpintroniK/libeXaDrums",2888.0486342593,2,6,0,3,6,0,0,7,2,"2",1.75,1.85714285714286 +"libexif-gtk",0.6899028208,2.4094585548,0.0374998074,"https://salsa.debian.org/debian-phototools-team/libexif-gtk","https://github.com/libexif/libexif-gtk.git",5131.8707407407,2,5,0,6,4,0,0,6,4,"4",1.71428571428571,1.66666666666667 +"ExtUtils-CBuilder",-0.5036465134,1.0344999475,-0.9863787578,"https://salsa.debian.org/perl-team/modules/packages/libextutils-cbuilder-perl","https://github.com/Perl-Toolchain-Gang/ExtUtils-CBuilder.git",4657.3346759259,8,12,0,11,12,0,0,17,3,"3",1.6,1.70588235294118 +"extutils-modulemaker",-1.6287177053,0.4949751478,-2.0632435211,"https://salsa.debian.org/perl-team/modules/packages/libextutils-modulemaker-perl","https://github.com/jkeenan/extutils-modulemaker.git",3844.1565972222,0,2,0,1,4,0,0,4,3,"3",2,2 +"libfcgi-debian",2.4025790949,4.8601691677,1.2415729675,"https://github.com/tehnick/libfcgi-debian","https://github.com/tehnick/libfcgi-debian",1176.1604513889,0,1,0,1,1,0,0,2,1,"1",2,1.5 +"File-MimeInfo",1.3146582473,3.1446233838,0.4775906292,"https://salsa.debian.org/perl-team/modules/packages/libfile-mimeinfo-perl","https://github.com/mbeijen/File-MimeInfo.git",3834.7099189815,10,12,0,18,50,0,0,53,3,"3",1.54545454545455,1.94339622641509 +"File-Modified",-0.1454311962,1.4011585761,-0.5041124489,"https://salsa.debian.org/perl-team/modules/packages/libfile-modified-perl","https://github.com/neilb/File-Modified",2145.0378472222,1,2,0,1,0,0,0,1,1,"1",1.66666666666667,1 +"file-save-home",-1.8007818428,0.3604487668,-2.2376298003,"https://salsa.debian.org/perl-team/modules/packages/libfile-save-home-perl","https://github.com/jkeenan/file-save-home",1776.9554861111,0,2,0,1,0,0,0,1,1,"1",2,1 +"File-Touch",0.098284703,1.8336262821,-0.2560959194,"https://salsa.debian.org/perl-team/modules/packages/libfile-touch-perl","https://github.com/neilb/File-Touch",4116.4970486111,1,3,0,2,3,0,0,3,3,"3",1.75,2 +"perl-File-Write-Rotate",-1.0296556573,1.3459084629,-1.5005566671,"https://salsa.debian.org/perl-team/modules/packages/libfile-write-rotate-perl","https://github.com/sharyanto/perl-File-Write-Rotate.git",3146.8113888889,0,17,0,5,6,0,0,7,2,"2",2,1.85714285714286 +"filehandle-unget",0.0063823885,1.5940372704,-0.2756601201,"https://salsa.debian.org/perl-team/modules/packages/libfilehandle-unget-perl","https://github.com/coppit/filehandle-unget.git",3647.0964930556,0,3,0,1,0,0,0,1,2,"2",2,1 +"Filesys-Notify-Simple",0.1924577796,2.7235880131,-0.2464440556,"https://salsa.debian.org/perl-team/modules/packages/libfilesys-notify-simple-perl","https://github.com/miyagawa/Filesys-Notify-Simple.git",4730.4164814815,0,13,0,9,27,0,0,27,3,"3",2,2 +"Filter",-0.2555356397,0.0318054425,-0.3077435742,"https://salsa.debian.org/debian/libfilter-perl","https://github.com/rurban/Filter",4868.3054861111,5,12,0,11,13,0,0,14,3,"3",1.70588235294118,1.92857142857143 +"filter-template",-1.0581574357,1.1903314595,-1.5773248661,"https://salsa.debian.org/perl-team/modules/packages/libfilter-template-perl","https://github.com/rcaputo/filter-template",1475.5620138889,0,1,0,1,0,0,0,1,1,"1",2,1 +"libfixposix",-0.4206114577,2.0891396228,-0.9806467917,"https://salsa.debian.org/common-lisp-team/libfixposix","https://github.com/sionescu/libfixposix.git",4611.074537037,9,4,0,10,24,0,0,28,3,"3",1.30769230769231,1.85714285714286 +"libfizmo",0.6273284521,4.5692102059,-0.4878285416,"https://github.com/chrender/libfizmo","https://github.com/chrender/libfizmo",4850.5273958333,1,7,0,3,3,0,0,3,3,"3",1.875,2 +"libfsntfs",0.3317907898,2.8232850998,-0.2751892076,"https://salsa.debian.org/pkg-security-team/libfsntfs","https://github.com/libyal/libfsntfs.git",3331.7044212963,0,1,0,1,16,0,2,18,2,"2",2,1.88888888888889 +"libfte",-1.9268255727,0.4828975174,-2.5557399688,"https://github.com/kpdyer/libfte/tree/debian/unstable","https://github.com/kpdyer/libfte",519.2035763889,0,6,1,3,6,0,0,6,1,"1",2,2 +"libfvde",0.9569035002,4.5103410226,-0.1365413277,"https://salsa.debian.org/pkg-security-team/libfvde","https://github.com/libyal/libfvde.git",3327.7584953704,0,1,0,1,79,0,2,81,2,"2",2,1.97530864197531 +"libfwnt",0.4678493195,3.4503175442,-0.3155910203,"https://salsa.debian.org/pkg-security-team/libfwnt","https://github.com/libyal/libfwnt",3707.8170833333,2,1,0,3,9,0,2,11,2,"2",1.33333333333333,1.81818181818182 +"libfwsi",0.4767451355,3.2824611568,-0.3244519074,"https://salsa.debian.org/pkg-security-team/libfwsi","https://github.com/libyal/libfwsi.git",3356.5179398148,0,1,0,1,19,0,2,21,2,"2",2,1.9047619047619 +"gclib",-1.2540063751,1.2393506434,-1.793979304,"https://salsa.debian.org/med-team/libgclib","https://github.com/gpertea/gclib",2782.2130555556,2,2,0,3,11,0,0,11,2,"2",1.5,2 +"gdal-grass",0.1785470496,2.1229290789,-0.4698383341,"https://salsa.debian.org/debian-gis-team/gdal-grass","https://github.com/OSGeo/gdal-grass.git",695.4440625,6,4,0,13,3,0,0,13,1,"1",1.4,1.23076923076923 +"geo-google-mapobject",-0.8736364381,1.4566987694,-1.3139869808,"https://salsa.debian.org/perl-team/modules/packages/libgeo-google-mapobject-perl","https://github.com/periapt/geo-google-mapobject.git",50.641099537,0,1,0,1,1,0,0,2,1,"1",2,1.5 +"geoip-api-perl",-0.1336111961,0.5223083889,-0.2976960926,"https://salsa.debian.org/perl-team/modules/packages/libgeo-ip-perl","https://github.com/maxmind/geoip-api-perl.git",4739.8765162037,5,12,0,10,18,0,0,22,3,"3",1.70588235294118,1.81818181818182 +"git-pureperl",-0.9270531395,0.744963627,-1.3901965303,"https://salsa.debian.org/perl-team/modules/packages/libgit-pureperl-perl","https://github.com/broquaint/git-pureperl.git",2866.3317824074,3,22,0,14,6,0,0,15,2,"2",1.88,1.4 +"libgit2",0.7426843467,1.4899627881,0.3118438265,"https://salsa.debian.org/debian/libgit2","https://github.com/libgit2/libgit2.git",5520.8953703704,104,508,0,399,0,0,0,399,4,"4",1.83006535947712,1 +"gnupg-interface",0.1615830389,0.739184756,-0.1104590476,"https://salsa.debian.org/perl-team/modules/packages/libgnupg-interface-perl","https://github.com/bestpractical/gnupg-interface.git",5505.2035300926,4,10,0,13,15,0,0,22,4,"4",1.71428571428571,1.68181818181818 +"Graph-D3",-2.0103879366,0.5815176639,-2.5923181246,"https://salsa.debian.org/perl-team/modules/packages/libgraph-d3-perl","https://github.com/shoheik/Graph-D3.git",1331.9675925926,1,3,0,3,3,0,0,4,1,"1",1.75,1.75 +"Graph-ReadWrite",0.0013928296,2.5958738365,-0.7361535942,"https://salsa.debian.org/perl-team/modules/packages/libgraph-readwrite-perl","https://github.com/neilb/Graph-ReadWrite.git",2428.8532986111,0,5,0,3,3,0,0,3,1,"1",2,2 +"p5-graph-writer-dsm",-2.8359680573,-0.7007526287,-3.3075782595,"https://salsa.debian.org/perl-team/modules/packages/libgraph-writer-dsm-perl","https://github.com/joenio/p5-graph-writer-dsm.git",1743.0827777778,0,2,0,1,0,0,0,1,1,"1",2,1 +"Graphics-ColorNames-WWW",-0.8846098514,1.1184900901,-1.3674713039,"https://salsa.debian.org/perl-team/modules/packages/libgraphics-colornames-www-perl","https://github.com/cfaerber/Graphics-ColorNames-WWW",3881.2659606482,0,3,0,1,0,0,0,1,3,"3",2,1 +"GraphViz",-0.0292832904,0.8748911062,-0.2131770807,"https://salsa.debian.org/perl-team/modules/packages/libgraphviz-perl","https://github.com/ronsavage/GraphViz.git",4149.5647685185,0,8,0,6,5,0,0,6,3,"3",2,1.83333333333333 +"libgtextutils",0.1810799898,2.3142226538,-0.6333026117,"https://salsa.debian.org/med-team/libgtextutils","https://github.com/agordon/libgtextutils.git",1379.9043171296,1,2,0,1,21,0,0,21,1,"1",1.66666666666667,2 +"gzstream",-0.4604271748,1.0639003315,-0.7280422963,"https://salsa.debian.org/med-team/libgzstream","https://github.com/kanedo/gzstream.git",1271.8150115741,0,2,0,1,4,0,0,4,1,"1",2,2 +"perl-html-stripscripts",-0.3606801075,1.7950802024,-0.7870879637,"https://salsa.debian.org/perl-team/modules/packages/libhtml-stripscripts-perl","https://github.com/clintongormley/perl-html-stripscripts.git",634.9694444444,1,1,0,2,4,0,0,4,1,"1",1.5,2 +"html-template",0.2623998312,1.2787610043,-0.0168521747,"https://salsa.debian.org/perl-team/modules/packages/libhtml-template-perl","https://github.com/mpeters/html-template.git",2360.5546296296,1,10,0,6,17,0,0,17,1,"1",1.90909090909091,2 +"HTML-Tiny",-0.2742049645,2.1158495273,-0.8034234216,"https://salsa.debian.org/perl-team/modules/packages/libhtml-tiny-perl","https://github.com/ap/HTML-Tiny.git",5143.9249537037,0,2,0,2,0,0,0,2,4,"4",2,1 +"HTTP-Message",1.2240574234,4.0822720732,0.2771667606,"https://salsa.debian.org/perl-team/modules/packages/libhttp-message-perl","https://github.com/libwww-perl/HTTP-Message.git",5655.1268518519,76,18,0,56,26,0,1,74,4,"4",1.19148936170213,1.35135135135135 +"HTTP-Proxy",-0.0949217121,1.2455203169,-0.6350123924,"https://salsa.debian.org/perl-team/modules/packages/libhttp-proxy-perl","https://github.com/book/HTTP-Proxy.git",4041.0415393519,7,1,0,8,15,0,0,18,3,"3",1.125,1.83333333333333 +"http-server-simple",0.8231195226,2.8527464993,0.0853932498,"https://salsa.debian.org/perl-team/modules/packages/libhttp-server-simple-perl","https://github.com/bestpractical/http-server-simple",2910.7674074074,4,11,0,11,4,0,0,12,2,"2",1.73333333333333,1.33333333333333 +"HTTP-Server-Simple-PSGI",-0.1977126095,1.9180365026,-0.6285309261,"https://salsa.debian.org/perl-team/modules/packages/libhttp-server-simple-psgi-perl","https://github.com/miyagawa/HTTP-Server-Simple-PSGI.git",1409.5210763889,0,2,0,2,3,0,0,4,1,"1",2,1.75 +"libhugetlbfs",-0.6583887261,1.4081810608,-1.179127099,"https://github.com/punitagrawal/libhugetlbfs.git","https://github.com/punitagrawal/libhugetlbfs.git",2039.1172800926,1,1,0,2,1,0,0,3,1,"1",1.5,1.33333333333333 +"libics",-1.5487571477,-0.7977160114,-1.7237343016,"https://salsa.debian.org/med-team/libics","https://github.com/svi-opensource/libics",4511.1015277778,4,15,0,9,13,0,0,14,3,"3",1.78947368421053,1.92857142857143 +"Net-IDN-Encode",0.0249334359,3.9722760412,-1.0659289095,"https://salsa.debian.org/perl-team/modules/packages/libidna-punycode-perl","https://github.com/cfaerber/Net-IDN-Encode.git",3674.6395949074,6,7,0,3,12,0,0,12,2,"2",1.53846153846154,2 +"iksemel",1.4056706717,3.3010035011,0.531380273,"https://salsa.debian.org/debian/libiksemel","https://github.com/meduketto/iksemel",2285.3264351852,0,3,0,0,15,0,0,15,1,"1",2,2 +"p5-image-exif",-0.3566210754,0.8027615419,-0.610345557,"https://salsa.debian.org/perl-team/modules/packages/libimage-exif-perl","https://github.com/arc/p5-image-exif.git",101.2955787037,2,2,0,1,1,0,0,2,1,"1",1.5,1.5 +"Image-MetaData-JPEG",0.1782474931,2.8015789571,-0.5717239967,"https://salsa.debian.org/perl-team/modules/packages/libimage-metadata-jpeg-perl","https://github.com/rjbs/Image-MetaData-JPEG.git",1915.8586921296,1,3,0,2,0,0,0,2,1,"1",1.75,1 +"image-size",0.2728915097,1.5941936935,-0.1459963248,"https://salsa.debian.org/perl-team/modules/packages/libimage-size-perl","https://github.com/rjray/image-size.git",4527.5378587963,0,12,0,10,14,0,0,14,3,"3",2,2 +"libinstpatch",0.3063715043,2.068273106,-0.0894533028,"https://salsa.debian.org/multimedia-team/libinstpatch","https://github.com/swami/libinstpatch",4470.7645833333,4,11,0,8,17,0,0,19,3,"3",1.73333333333333,1.89473684210526 +"p5-io-callback",-2.0212295476,0.6694774365,-2.7211969358,"https://salsa.debian.org/perl-team/modules/packages/libio-callback-perl","https://github.com/tobyink/p5-io-callback.git",2909.5988078704,0,1,0,1,0,0,0,1,2,"2",2,1 +"IO-Digest",-0.1769998583,2.4353442239,-0.8553329296,"https://salsa.debian.org/perl-team/modules/packages/libio-digest-perl","https://github.com/clkao/IO-Digest.git",1863.0997106482,1,4,0,3,4,0,0,4,1,"1",1.8,2 +"File-Flock",0.2170241797,2.8246432586,-0.6360167425,"https://salsa.debian.org/perl-team/modules/packages/libio-event-perl","https://github.com/muir/File-Flock.git",474.8396990741,0,4,0,4,6,0,0,6,1,"1",2,2 +"LibIO-Interface-Perl",1.0184295465,4.1476474847,0.0508969184,"https://salsa.debian.org/perl-team/modules/packages/libio-interface-perl","https://github.com/lstein/LibIO-Interface-Perl.git",2278.4801041667,0,2,0,1,6,0,0,7,1,"1",2,1.85714285714286 +"perl-io-socket-inet6",1.0536105818,2.554159089,0.3603685147,"https://salsa.debian.org/perl-team/modules/packages/libio-socket-inet6-perl","https://github.com/shlomif/perl-io-socket-inet6.git",5052.8307060185,0,3,0,1,0,0,0,1,4,"4",2,1 +"IPC-Run3",0.5630723174,3.202492468,-0.0863000736,"https://salsa.debian.org/perl-team/modules/packages/libipc-run3-perl","https://github.com/rjbs/IPC-Run3.git",1899.0353819445,8,2,0,10,19,0,0,20,1,"1",1.2,1.95 +"ipc-system-simple",0.7025068064,3.3730782331,0.0378027178,"https://salsa.debian.org/perl-team/modules/packages/libipc-system-simple-perl","https://github.com/pjf/ipc-system-simple.git",5306.4576388889,4,11,0,8,42,0,0,42,4,"4",1.73333333333333,2 +"ITL",0.0254308757,1.554670546,-0.4274590481,"https://salsa.debian.org/islamic-team/libitl","https://github.com/arabeyes-org/ITL",3251.4730902778,2,13,0,6,19,0,0,19,2,"2",1.86666666666667,2 +"libitl-gobject",-0.7439913292,1.4835301757,-1.3690898031,"https://salsa.debian.org/islamic-team/libitl-gobject","https://github.com/aelmahmoudy/libitl-gobject.git",2211.2291898148,0,2,0,1,0,0,0,1,1,"1",2,1 +"jbzip2",-0.1117625553,1.7645153992,-0.5532046545,"https://salsa.debian.org/java-team/libjbzip2-java","https://github.com/routeKIT/jbzip2.git",1394.2040046296,0,2,0,1,0,0,0,1,1,"1",2,1 +"libjcat",-2.9665296188,-1.1386554909,-3.3229751102,"https://salsa.debian.org/efi-team/libjcat","https://github.com/hughsie/libjcat.git",1373.0888425926,7,5,0,7,13,0,0,14,1,"1",1.41666666666667,1.92857142857143 +"jifty-dbi",-1.6146679558,0.7852306876,-2.2707603438,"https://salsa.debian.org/perl-team/modules/packages/libjifty-dbi-perl","https://github.com/bestpractical/jifty-dbi.git",2518.1463888889,1,16,0,21,6,0,0,25,1,"1",1.94117647058824,1.24 +"Lingua-EN-Inflect-Number",0.1280326899,2.5007020448,-0.4017863004,"https://salsa.debian.org/perl-team/modules/packages/liblingua-en-inflect-number-perl","https://github.com/neilbowers/Lingua-EN-Inflect-Number",2030.0671527778,1,2,0,1,0,0,0,1,1,"1",1.66666666666667,1 +"Lingua-EN-Numbers-Ordinate",-0.5287396988,1.7136767904,-0.9568574903,"https://salsa.debian.org/perl-team/modules/packages/liblingua-en-numbers-ordinate-perl","https://github.com/neilb/Lingua-EN-Numbers-Ordinate",4119.2290856482,1,2,0,1,0,0,0,1,3,"3",1.66666666666667,1 +"Lingua-PT-Stemmer",-0.0370378021,1.7556059977,-0.4052943013,"https://salsa.debian.org/perl-team/modules/packages/liblingua-pt-stemmer-perl","https://github.com/neilb/Lingua-PT-Stemmer.git",472.7143518519,1,2,0,1,0,0,0,1,1,"1",1.66666666666667,1 +"list-compare",0.3913134488,2.6930680807,-0.0910990527,"https://salsa.debian.org/perl-team/modules/packages/liblist-compare-perl","https://github.com/jkeenan/list-compare.git",5186.5518171296,4,4,0,6,7,0,0,7,4,"4",1.5,2 +"Locale-Maketext-Gettext",-0.4988694756,1.1302337571,-0.8279808959,"https://salsa.debian.org/perl-team/modules/packages/liblocale-maketext-gettext-perl","https://github.com/imacat/Locale-Maketext-Gettext.git",519.6569444444,0,2,0,1,0,0,0,1,1,"1",2,1 +"locale-maketext-lexicon",0.161275632,1.8969602532,-0.2840997851,"https://salsa.debian.org/perl-team/modules/packages/liblocale-maketext-lexicon-perl","https://github.com/clintongormley/locale-maketext-lexicon.git",1951.7074074074,1,9,0,7,17,0,0,17,1,"1",1.9,2 +"p5-Locales",-1.0439124558,1.1408551718,-1.4785456456,"https://salsa.debian.org/perl-team/modules/packages/liblocales-perl","https://github.com/drmuey/p5-Locales.git",1740.6568287037,0,3,0,2,4,0,0,4,1,"1",2,2 +"liblockfile-debian",1.3452804851,2.1620317868,0.8349604945,"https://github.com/miquels/liblockfile-debian","https://github.com/miquels/liblockfile-debian",1484.1868055556,0,2,0,1,0,0,0,1,1,"1",2,1 +"log-message-simple",0.207617298,1.6631748554,-0.0635138373,"https://salsa.debian.org/perl-team/modules/packages/liblog-message-simple-perl","https://github.com/jib/log-message-simple.git",1230.0807175926,0,3,0,2,1,0,0,2,1,"1",2,1.5 +"libltc",0.2546232027,2.4814619881,-0.1954510519,"https://salsa.debian.org/multimedia-team/libltc","https://github.com/x42/libltc",3674.4912152778,2,8,0,6,48,0,0,50,2,"2",1.8,1.96 +"p5-lwp-useragent-chicaching",-0.7942219141,1.5178916477,-1.2272281043,"https://salsa.debian.org/perl-team/modules/packages/liblwp-useragent-chicaching-perl","https://github.com/kjetilk/p5-lwp-useragent-chicaching.git",1283.7690740741,0,1,0,1,3,0,0,3,1,"1",2,2 +"magpie",-1.7158635114,1.197884825,-2.5208982983,"https://salsa.debian.org/perl-team/modules/packages/libmagpie-perl","https://github.com/tamarou/magpie.git",2275.6417824074,0,6,0,5,5,0,3,9,1,"1",2,1.55555555555556 +"mail-mbox-messageparser",-0.0992180029,0.3833084593,-0.2549281336,"https://salsa.debian.org/perl-team/modules/packages/libmail-mbox-messageparser-perl","https://github.com/coppit/mail-mbox-messageparser.git",3258.3029513889,0,3,0,1,0,0,0,1,2,"2",2,1 +"perl5-MailTools",1.0529685668,2.1520713579,0.4690208845,"https://salsa.debian.org/perl-team/modules/packages/libmailtools-perl","https://github.com/markov2/perl5-MailTools",1648.7267013889,0,2,0,1,4,0,0,4,1,"1",2,2 +"libmatemixer",0.5190776518,2.8714266987,-0.0439618764,"https://salsa.debian.org/debian-mate-team/libmatemixer","https://github.com/mate-desktop/libmatemixer.git",3404.5255092593,7,20,0,15,31,0,0,35,2,"2",1.74074074074074,1.88571428571429 +"perl-math-basecalc",-1.0492971392,0.7762474864,-1.6069135742,"https://salsa.debian.org/perl-team/modules/packages/libmath-basecalc-perl","https://github.com/kenahoo/perl-math-basecalc.git",3269.0290740741,0,8,0,2,5,0,0,5,2,"2",2,2 +"Math-GMP",-0.4977700318,1.2717897116,-0.9791927568,"https://salsa.debian.org/perl-team/modules/packages/libmath-gmp-perl","https://github.com/turnstep/Math-GMP.git",2969.082974537,1,6,0,5,6,0,0,6,2,"2",1.85714285714286,2 +"Math-Random-ISAAC",0.6477137679,3.3609472371,-0.0377506361,"https://salsa.debian.org/perl-team/modules/packages/libmath-random-isaac-perl","https://github.com/jawnsy/Math-Random-ISAAC",2416.3080324074,0,1,0,1,1,0,0,1,1,"1",2,2 +"Math-Random-ISAAC-XS",0.4200441154,2.426176795,-0.0688144675,"https://salsa.debian.org/perl-team/modules/packages/libmath-random-isaac-xs-perl","https://github.com/jawnsy/Math-Random-ISAAC-XS.git",2412.8853703704,0,1,0,1,0,0,0,1,1,"1",2,1 +"math-random-oo",-1.3518748941,0.9987771421,-1.8072166016,"https://salsa.debian.org/perl-team/modules/packages/libmath-random-oo-perl","https://github.com/dagolden/math-random-oo.git",1499.3150694445,0,1,0,1,2,0,0,3,1,"1",2,1.66666666666667 +"mce-perl",-0.2406488454,2.0794415417,-0.6733224842,"https://salsa.debian.org/perl-team/modules/packages/libmce-perl","https://github.com/marioroy/mce-perl.git",2944.7772337963,1,6,0,6,17,0,0,17,2,"2",1.85714285714286,2 +"Memoize-ExpireLRU",0.1936518014,2.9309817533,-0.4019145174,"https://salsa.debian.org/perl-team/modules/packages/libmemoize-expirelru-perl","https://github.com/neilb/Memoize-ExpireLRU",624.640474537,1,2,0,1,0,0,0,1,1,"1",1.66666666666667,1 +"Message-Passing",-1.5721707445,-0.5831799889,-1.7635460333,"https://salsa.debian.org/perl-team/modules/packages/libmessage-passing-perl","https://github.com/suretec/Message-Passing.git",2987.7789236111,1,15,0,11,14,0,0,16,2,"2",1.9375,1.875 +"method-signatures-simple",-0.5051718146,2.287989514,-1.1367149384,"https://salsa.debian.org/perl-team/modules/packages/libmethod-signatures-simple-perl","https://github.com/rhesa/method-signatures-simple.git",4262.9309953704,0,6,0,2,4,0,0,4,3,"3",2,2 +"minIni",-0.452730067,0.8302579746,-0.745676424,"https://salsa.debian.org/yangfl-guest/minIni","https://github.com/compuphase/minIni",2280.3336342593,2,6,0,4,22,0,0,22,1,"1",1.75,2 +"MLDBM",0.2556850889,2.2171328226,-0.1413700534,"https://salsa.debian.org/perl-team/modules/packages/libmldbm-perl","https://github.com/chorny/MLDBM.git",1906.0319791667,3,2,0,2,0,0,0,2,1,"1",1.4,1 +"Module-CPANTS-Analyse",0.6092458087,3.4788905255,-0.4688881027,"https://salsa.debian.org/perl-team/modules/packages/libmodule-cpants-analyse-perl","https://github.com/cpants/Module-CPANTS-Analyse.git",5647.7312152778,8,20,0,23,21,0,0,33,4,"4",1.71428571428571,1.63636363636364 +"module-extract-use",-1.4214887251,0.7223462254,-1.8616614077,"https://salsa.debian.org/perl-team/modules/packages/libmodule-extract-use-perl","https://github.com/briandfoy/module-extract-use.git",2918.7995717593,0,7,0,4,8,0,0,8,2,"2",2,2 +"Module-Find",0.5306890725,2.9619110746,-0.0631954531,"https://salsa.debian.org/perl-team/modules/packages/libmodule-find-perl","https://github.com/crenz/Module-Find.git",4710.686875,2,8,0,7,14,0,0,15,3,"3",1.8,1.93333333333333 +"module-install-readmefrompod",-1.8312131642,-0.8033082466,-2.0615814708,"https://salsa.debian.org/perl-team/modules/packages/libmodule-install-readmefrompod-perl","https://github.com/bingos/module-install-readmefrompod.git",2847.0250694445,0,7,0,6,4,0,0,6,2,"2",2,1.66666666666667 +"Perl-Module-Install-XSUtil",-1.9528681484,-0.4161990227,-2.2440219121,"https://salsa.debian.org/perl-team/modules/packages/libmodule-install-xsutil-perl","https://github.com/gfx/Perl-Module-Install-XSUtil.git",1649.8556828704,0,9,0,3,4,0,0,6,1,"1",2,1.66666666666667 +"Module-Manifest",-0.2750809802,2.0412664766,-0.7072069311,"https://salsa.debian.org/perl-team/modules/packages/libmodule-manifest-perl","https://github.com/karenetheridge/Module-Manifest",3547.1878935185,0,3,0,3,0,0,0,3,2,"2",2,1 +"module-manifest-skip-pm",-0.3311047045,2.0896483213,-0.8611240864,"https://salsa.debian.org/perl-team/modules/packages/libmodule-manifest-skip-perl","https://github.com/ingydotnet/module-manifest-skip-pm.git",1169.1213194445,0,5,0,3,11,0,0,11,1,"1",2,2 +"p5-module-package-rdf",-1.9996964425,0.8089579857,-2.7247782661,"https://salsa.debian.org/perl-team/modules/packages/libmodule-package-rdf-perl","https://github.com/tobyink/p5-module-package-rdf",668.6822106481,0,1,0,1,0,0,0,1,1,"1",2,1 +"module-signature",0.6153933477,2.3081438868,0.0588548985,"https://salsa.debian.org/perl-team/modules/packages/libmodule-signature-perl","https://github.com/audreyt/module-signature.git",4414.5291782407,0,17,0,11,23,0,0,23,3,"3",2,2 +"Module-Starter-Plugin-CGIApp",-1.0772217685,1.7774421629,-2.0362185062,"https://github.com/jaldhar/Module-Starter-Plugin-CGIApp","https://github.com/jaldhar/Module-Starter-Plugin-CGIApp",4024.0661921296,0,7,0,4,4,0,0,4,3,"3",2,2 +"p5-moops",-2.0160241228,0.1848579356,-2.5747690554,"https://salsa.debian.org/perl-team/modules/packages/libmoops-perl","https://github.com/tobyink/p5-moops",2419.9678819445,0,3,0,2,7,0,0,7,1,"1",2,2 +"p5-moosex-attributetags",-1.484446991,0.7122802252,-1.9169457017,"https://salsa.debian.org/perl-team/modules/packages/libmoosex-attributetags-perl","https://github.com/tobyink/p5-moosex-attributetags",2042.2449074074,0,1,0,1,4,0,0,4,1,"1",2,2 +"perl-mp3-info",0.9722005224,3.0635904685,0.1459746264,"https://salsa.debian.org/perl-team/modules/packages/libmp3-info-perl","https://github.com/JJ/perl-mp3-info.git",3267.4327777778,1,4,0,1,3,0,0,3,2,"2",1.8,2 +"libmsiecf",0.4655231291,3.4302212781,-0.3202002984,"https://salsa.debian.org/pkg-security-team/libmsiecf","https://github.com/libyal/libmsiecf.git",3548.1866898148,0,1,0,1,5,0,2,7,2,"2",2,1.71428571428571 +"multidimensional",0.6378488709,3.4059130057,-0.1088057954,"https://salsa.debian.org/perl-team/modules/packages/libmultidimensional-perl","https://github.com/ilmari/multidimensional",4293.3777314815,1,3,0,4,4,0,0,6,3,"3",1.75,1.66666666666667 +"libmurmurhash",-1.1606750215,1.2419656851,-1.5922212752,"https://salsa.debian.org/med-team/libmurmurhash","https://github.com/kloetzl/libmurmurhash.git",1568.0675578704,0,1,0,1,0,0,0,1,1,"1",2,1 +"perl-nagios-object",-0.0287280626,2.4165825039,-0.5145037556,"https://salsa.debian.org/perl-team/modules/packages/libnagios-object-perl","https://github.com/duncs/perl-nagios-object.git",4719.3367939815,1,14,0,9,10,0,0,11,3,"3",1.93333333333333,1.90909090909091 +"libnatpmp",0.2543409022,1.1083518392,4.5219738185424e-05,"https://salsa.debian.org/miniupnp-team/libnatpmp","https://github.com/miniupnp/libnatpmp",3832.0982523148,3,20,0,19,24,0,0,26,3,"3",1.8695652173913,1.92307692307692 +"libnbcompat",-5.0470695639,-2.6158016281,-5.4799549879,"https://github.com/jgoerzen/libnbcompat","https://github.com/jgoerzen/libnbcompat",3888.0046759259,0,19,0,0,2,0,0,2,3,"3",2,2 +"libndp",0.413875636,2.2608821975,0.0018314313,"https://salsa.debian.org/debian/libndp","https://github.com/jpirko/libndp.git",3924.0402314815,9,4,0,9,18,0,0,20,3,"3",1.30769230769231,1.9 +"libneo4j-client",-0.4420044551,1.822604323,-1.1962509735,"https://github.com/cleishm/libneo4j-client","https://github.com/cleishm/libneo4j-client",1826.3064351852,2,5,0,3,62,0,1,63,1,"1",1.71428571428571,1.98412698412698 +"p5-Net-DNS-Lite",-0.3886008757,1.7387555976,-0.810307745,"https://salsa.debian.org/perl-team/modules/packages/libnet-dns-lite-perl","https://github.com/kazuho/p5-Net-DNS-Lite.git",2215.0713888889,0,7,0,6,9,0,0,9,1,"1",2,2 +"Net-IDN-Encode",0.2021202967,2.48699816,-0.240749263,"https://salsa.debian.org/perl-team/modules/packages/libnet-idn-encode-perl","https://github.com/cfaerber/Net-IDN-Encode.git",3674.6395949074,6,7,0,3,12,0,0,12,2,"2",1.53846153846154,2 +"perl-net-jabber-bot",-1.4064709925,2.213836255,-2.339836966,"https://salsa.debian.org/perl-team/modules/packages/libnet-jabber-bot-perl","https://github.com/toddr/perl-net-jabber-bot.git",4656.9431712963,0,12,0,5,11,0,1,12,3,"3",2,1.91666666666667 +"Net-LDAP-FilterBuilder",-1.0311673826,1.3164424951,-1.5505907465,"https://salsa.debian.org/perl-team/modules/packages/libnet-ldap-filterbuilder-perl","https://github.com/ollyg/Net-LDAP-FilterBuilder.git",3727.9931481482,1,4,0,2,2,0,0,2,2,"2",1.8,2 +"libnet-ldapapi-perl",0.3298012331,4.2171229252,-0.937584259,"https://github.com/whm/libnet-ldapapi-perl","https://github.com/whm/libnet-ldapapi-perl",2319.3761458333,0,8,0,3,3,0,0,3,1,"1",2,2 +"Net-Netmask",0.1949090184,1.297397456,-0.0893189593,"https://salsa.debian.org/perl-team/modules/packages/libnet-netmask-perl","https://github.com/jmaslak/Net-Netmask.git",4478.3867592593,1,7,0,6,3,0,0,7,3,"3",1.875,1.42857142857143 +"Net-OpenID-Server",-1.0955544028,0.6845393717,-1.5372515082,"https://salsa.debian.org/perl-team/modules/packages/libnet-openid-server-perl","https://github.com/robn/Net-OpenID-Server.git",848.2155092593,2,3,0,3,3,0,0,4,1,"1",1.6,1.75 +"Net-SMTP-TLS",-0.1132113761,2.611489661,-0.7024918462,"https://salsa.debian.org/perl-team/modules/packages/libnet-smtp-tls-butmaintained-perl","https://github.com/fayland/Net-SMTP-TLS",3215.1503240741,2,5,0,4,4,0,0,4,2,"2",1.71428571428571,2 +"libnfo",-1.6756209904,0.1206412877,-2.1869772617,"https://salsa.debian.org/debian/libnfo","https://github.com/GeeXboX/libnfo",1108.0312384259,0,6,0,3,0,0,0,3,1,"1",2,1 +"libnids",1.4807006894,2.868899345,0.7254298026,"https://salsa.debian.org/pkg-security-team/libnids","https://github.com/MITRECND/libnids.git",3593.0894791667,1,9,0,6,10,0,0,12,2,"2",1.9,1.83333333333333 +"number-fraction",-1.540099922,1.0079905103,-2.1216475277,"https://salsa.debian.org/perl-team/modules/packages/libnumber-fraction-perl","https://github.com/p5-number-fraction/number-fraction.git",5664.8216203704,3,11,0,5,9,0,0,9,4,"4",1.78571428571429,2 +"libofa",0.4733582109,1.4335688496,0.0963115975,"https://salsa.debian.org/debian/libofa","https://github.com/tanob/libofa.git",2279.4909837963,1,2,0,1,3,0,0,3,1,"1",1.66666666666667,2 +"libolecf",0.4621655423,3.3267217863,-0.317708483,"https://salsa.debian.org/pkg-security-team/libolecf","https://github.com/libyal/libolecf.git",3351.0533101852,0,1,0,1,5,0,2,7,2,"2",2,1.71428571428571 +"libopenaptx",-1.7697893715,0.4021046488,-2.2318938305,"https://salsa.debian.org/debian/libopenaptx","https://github.com/pali/libopenaptx",1024.2505671296,0,2,0,2,31,0,0,31,1,"1",2,2 +"pal",-0.7436164089,0.7988128956,-1.0249643964,"https://salsa.debian.org/med-team/libpal-java","https://github.com/tamuri/pal",382.9409953704,0,2,0,1,0,0,0,1,1,"1",2,1 +"p5-Palm",0.0204029609,1.2197989009,-0.348294955,"https://salsa.debian.org/perl-team/modules/packages/libpalm-perl","https://github.com/madsen/p5-Palm",2036.3955092593,2,5,0,5,0,0,0,5,1,"1",1.71428571428571,1 +"pam-encfs",-0.0672752006,1.0391890178,-0.5514410008,"https://salsa.debian.org/debian/libpam-encfs","https://github.com/tinti/pam-encfs",2773.2122222222,0,4,0,2,2,0,0,4,2,"2",2,1.5 +"libpam-pwdfile",-0.1067432026,0.5002558718,-0.3226316808,"https://github.com/tiwe-de/libpam-pwdfile/tree/debian","https://github.com/tiwe-de/libpam-pwdfile",923.3027546296,2,2,0,2,8,0,0,9,1,"1",1.5,1.88888888888889 +"PGObject-Type-DateTime",-1.4815397898,0.6709430232,-1.9159731716,"https://salsa.debian.org/perl-team/modules/packages/libpgobject-type-datetime-perl","https://github.com/ledgersmb/PGObject-Type-DateTime.git",3652.6989467593,0,8,0,4,6,0,0,6,2,"2",2,2 +"PGObject-Util-DBAdmin",-1.5448908629,0.6014090328,-1.9825388902,"https://salsa.debian.org/perl-team/modules/packages/libpgobject-util-dbadmin-perl","https://github.com/ledgersmb/PGObject-Util-DBAdmin.git",2615.9496412037,0,5,0,3,10,0,0,10,1,"1",2,2 +"pgp-sign",-0.5037910117,2.2440221924,-1.3324653392,"https://salsa.debian.org/rra/libpgp-sign-perl","https://github.com/rra/pgp-sign",2555.0956134259,1,5,0,2,2,0,0,2,1,"1",1.83333333333333,2 +"perl5-PGPLOT",-0.1986814175,1.8032644315,-0.9289181032,"https://salsa.debian.org/perl-team/modules/packages/libpgplot-perl","https://github.com/PDLPorters/perl5-PGPLOT.git",2564.25125,4,7,0,6,6,0,0,7,1,"1",1.63636363636364,1.85714285714286 +"Plack-Middleware-CSRFBlock",-2.8898967554,-0.7198364868,-3.3240833199,"https://salsa.debian.org/perl-team/modules/packages/libplack-middleware-csrfblock-perl","https://github.com/mattp-/Plack-Middleware-CSRFBlock",1436.9725347222,1,7,0,3,3,0,0,4,1,"1",1.875,1.75 +"Plack-Middleware-Deflater",-0.8686046005,1.4026303206,-1.3409550295,"https://salsa.debian.org/perl-team/modules/packages/libplack-middleware-deflater-perl","https://github.com/miyagawa/Plack-Middleware-Deflater.git",4308.6622222222,0,5,0,3,10,0,0,11,3,"3",2,1.90909090909091 +"Plack-Middleware-File-Sass",-3.742621833,-1.2109466542,-4.3202138211,"https://salsa.debian.org/perl-team/modules/packages/libplack-middleware-file-sass-perl","https://github.com/miyagawa/Plack-Middleware-File-Sass.git",372.7359490741,0,1,0,1,4,0,0,5,1,"1",2,1.8 +"plack-test-anyevent",-2.2481916187,0.456054425,-2.955500627,"https://salsa.debian.org/perl-team/modules/packages/libplack-test-anyevent-perl","https://github.com/hoelzro/plack-test-anyevent.git",2226.7020138889,0,6,0,3,7,0,0,7,1,"1",2,2 +"pod-2-docbook",-2.1858439437,0.1225281674,-2.6170683957,"https://salsa.debian.org/perl-team/modules/packages/libpod-2-docbook-perl","https://github.com/jozef/pod-2-docbook",1292.6652546296,0,6,0,3,2,0,0,3,1,"1",2,1.66666666666667 +"libpod-webserver-perl",-0.4204997081,2.3714699089,-1.5368509522,"https://github.com/mogaal/libpod-webserver-perl","https://github.com/mogaal/libpod-webserver-perl",801.0357291667,1,1,0,1,1,0,0,2,1,"1",1.5,1.5 +"Pod-Wordlist-hanekomu",-2.3524762868,-0.0387599898,-2.7860641364,"https://salsa.debian.org/perl-team/modules/packages/libpod-wordlist-hanekomu-perl","https://github.com/dagolden/Pod-Wordlist-hanekomu",1571.1035763889,0,3,0,2,0,0,0,2,1,"1",2,1 +"poe-component-client-http",-1.0501503685,-0.2644618645,-1.3283877911,"https://salsa.debian.org/perl-team/modules/packages/libpoe-component-client-http-perl","https://github.com/rcaputo/poe-component-client-http",2297.0143402778,1,4,0,7,6,0,0,10,1,"1",1.8,1.6 +"poe-component-client-ident",-2.7407891821,-1.3969533145,-3.0142475956,"https://salsa.debian.org/perl-team/modules/packages/libpoe-component-client-ident-perl","https://github.com/bingos/poe-component-client-ident.git",49.7081481481,0,1,0,1,0,0,0,1,1,"1",2,1 +"poe-component-client-keepalive",-0.9123072197,1.3895866184,-1.3489172881,"https://salsa.debian.org/perl-team/modules/packages/libpoe-component-client-keepalive-perl","https://github.com/rcaputo/poe-component-client-keepalive.git",2357.5085300926,2,4,0,8,6,0,0,10,1,"1",1.66666666666667,1.6 +"poe-filter-ircd",-0.3745579428,1.9358389215,-0.8315150468,"https://salsa.debian.org/perl-team/modules/packages/libpoe-filter-ircd-perl","https://github.com/bingos/poe-filter-ircd.git",1552.6868865741,0,4,0,3,1,0,0,3,1,"1",2,1.33333333333333 +"poe-loop-tk",-0.195847078,2.023755452,-0.7553813013,"https://salsa.debian.org/perl-team/modules/packages/libpoe-loop-tk-perl","https://github.com/rcaputo/poe-loop-tk",2011.4116435185,0,7,0,11,1,0,0,12,1,"1",2,1.08333333333333 +"Probe-Perl",-0.1208694783,2.6826431693,-0.7468528277,"https://salsa.debian.org/perl-team/modules/packages/libprobe-perl-perl","https://github.com/kenahoo/Probe-Perl",112.0281712963,0,2,0,1,0,0,0,1,1,"1",2,1 +"perl-proc-processtable",0.037499403,0.4824843529,-0.0771518619,"https://salsa.debian.org/perl-team/modules/packages/libproc-processtable-perl","https://github.com/jwbargsten/perl-proc-processtable",3896.7371180556,1,25,0,20,24,0,0,25,3,"3",1.96153846153846,1.96 +"libpuzzle",-0.6680140267,0.6529557031,-1.1243331237,"https://salsa.debian.org/debian-phototools-team/libpuzzle","https://github.com/jedisct1/libpuzzle",2324.9386458333,1,8,0,5,25,0,0,26,1,"1",1.88888888888889,1.96153846153846 +"libpwquality",0.5103514314,1.8778785061,0.0684762008,"https://salsa.debian.org/gnome-team/libpwquality","https://github.com/libpwquality/libpwquality.git",4429.9063773148,51,15,0,49,43,0,0,74,3,"3",1.22727272727273,1.58108108108108 +"libqcow",0.4345572635,3.1501552197,-0.2914212024,"https://salsa.debian.org/pkg-security-team/libqcow","https://github.com/libyal/libqcow.git",3715.7671527778,0,1,0,1,19,0,2,21,2,"2",2,1.9047619047619 +"p5-rdf-acl",-2.0654979491,1.2809082376,-3.0733910723,"https://salsa.debian.org/perl-team/modules/packages/librdf-acl-perl","https://github.com/tobyink/p5-rdf-acl",1688.9962731482,0,1,0,1,0,0,0,1,1,"1",2,1 +"RDF-aREF",-1.6321655974,0.5126731294,-2.0632435211,"https://salsa.debian.org/perl-team/modules/packages/librdf-aref-perl","https://github.com/nichtich/RDF-aREF.git",2565.8667708333,2,8,0,4,11,0,1,12,1,"1",1.8,1.91666666666667 +"RDF-Generator-Void",-1.6331954297,0.6259569496,-2.0634280229,"https://salsa.debian.org/perl-team/modules/packages/librdf-generator-void-perl","https://github.com/kjetilk/RDF-Generator-Void.git",1725.5093171296,0,6,0,4,4,0,0,5,1,"1",2,1.8 +"RDF-Helper-Properties",-1.4850797677,1.0749945226,-2.1065327245,"https://salsa.debian.org/perl-team/modules/packages/librdf-helper-properties-perl","https://github.com/kjetilk/RDF-Helper-Properties.git",2324.5435416667,0,5,0,3,5,0,0,5,1,"1",2,2 +"RDF-LinkedData",-1.5297189997,-0.0678424369,-2.0840021227,"https://salsa.debian.org/perl-team/modules/packages/librdf-linkeddata-perl","https://github.com/kjetilk/RDF-LinkedData.git",4060.5603472222,0,7,0,4,7,0,0,7,3,"3",2,2 +"p5-rdf-ns-curated",-1.1846297848,1.0171931504,-1.6213429531,"https://salsa.debian.org/perl-team/modules/packages/librdf-ns-curated-perl","https://github.com/kjetilk/p5-rdf-ns-curated.git",2949.064224537,0,4,0,3,5,0,0,5,2,"2",2,2 +"RDF-NS",-0.5250160099,1.01221794,-0.8720836033,"https://salsa.debian.org/perl-team/modules/packages/librdf-ns-perl","https://github.com/nichtich/RDF-NS.git",4253.4168518519,2,5,0,4,13,0,0,13,3,"3",1.71428571428571,2 +"p5-rdf-query-client",-1.1913139725,0.7502046078,-1.7548289358,"https://salsa.debian.org/perl-team/modules/packages/librdf-query-client-perl","https://github.com/tobyink/p5-rdf-query-client",1767.4564930556,0,1,0,1,2,0,0,2,1,"1",2,2 +"libSavitar",-0.0624513388,1.310740378,-0.382634692,"https://salsa.debian.org/3dprinting-team/libsavitar","https://github.com/Ultimaker/libSavitar.git",2417.8881481482,12,19,0,17,35,0,0,38,1,"1",1.61290322580645,1.92105263157895 +"libsbsms",0.1678753971,1.6421405226,-0.1313541464,"https://salsa.debian.org/multimedia-team/libsbsms","https://github.com/claytonotey/libsbsms.git",571.9734837963,2,6,0,5,9,0,0,9,1,"1",1.75,2 +"p5-scalar-does",-0.5366651555,1.2277898949,-0.9504713641,"https://salsa.debian.org/perl-team/modules/packages/libscalar-does-perl","https://github.com/tobyink/p5-scalar-does",1614.181099537,0,3,0,1,2,0,0,2,1,"1",2,2 +"libscca",0.4636827697,3.5204192618,-0.331124383,"https://salsa.debian.org/pkg-security-team/libscca","https://github.com/libyal/libscca",3348.012650463,1,1,0,2,11,0,2,13,2,"2",1.5,1.84615384615385 +"SDL_net",0.2879256018,2.7048282977,-0.176557932,"https://salsa.debian.org/sdl-team/libsdl2-net","https://github.com/libsdl-org/SDL_net.git",5565.0336111111,10,12,0,14,0,0,0,14,4,"4",1.54545454545455,1 +"perl-SHARYANTO-Utils",-2.3441465625,-0.0852227274,-2.7855609174,"https://salsa.debian.org/perl-team/modules/packages/libsharyanto-utils-perl","https://github.com/perlancar/perl-SHARYANTO-Utils.git",2945.5977546296,0,13,0,2,4,0,0,5,2,"2",2,1.8 +"simpleini",-3.1256993279,-0.5243099389,-3.727940764,"https://salsa.debian.org/yangfl-guest/simpleini","https://github.com/brofield/simpleini",5767.1290509259,12,11,0,17,66,0,0,66,4,"4",1.47826086956522,2 +"libsmdev",0.4901912636,3.5473022844,-0.3181659308,"https://salsa.debian.org/pkg-security-team/libsmdev","https://github.com/libyal/libsmdev",2801.6257060185,0,1,0,1,7,0,2,9,2,"2",2,1.77777777777778 +"libsml",-2.5583752988,0.0607386648,-3.2378106609,"https://github.com/volkszaehler/libsml/tree/debian","https://github.com/volkszaehler/libsml",4561.3065740741,12,15,0,19,11,0,0,23,3,"3",1.55555555555556,1.47826086956522 +"libsmraw",0.4741059034,3.3966321112,-0.3210256742,"https://salsa.debian.org/pkg-security-team/libsmraw","https://github.com/libyal/libsmraw.git",2800.5750925926,0,1,0,1,3,0,2,5,2,"2",2,1.6 +"SNMP-Extension-PassPersist",0.1226846415,3.0805333609,-0.7398128832,"https://salsa.debian.org/perl-team/modules/packages/libsnmp-extension-passpersist-perl","https://github.com/maddingue/SNMP-Extension-PassPersist.git",1526.080787037,0,1,0,1,2,0,0,3,1,"1",2,1.66666666666667 +"SOAP-WSDL",0.2494473126,2.2213700721,-0.2151765381,"https://salsa.debian.org/perl-team/modules/packages/libsoap-wsdl-perl","https://github.com/scrottie/SOAP-WSDL",3956.8486342593,2,7,0,5,8,0,0,8,3,"3",1.77777777777778,2 +"debian-libsodium",0.7652440851,2.6480355078,0.1255307975,"https://github.com/gcsideal/debian-libsodium","https://github.com/gcsideal/debian-libsodium",2198.6639814815,0,2,0,2,3,0,0,5,1,"1",2,1.6 +"sort-naturally",0.7344792523,3.7354162178,-0.0108935716,"https://salsa.debian.org/perl-team/modules/packages/libsort-naturally-perl","https://github.com/bingos/sort-naturally.git",681.4402893519,0,3,0,3,6,0,0,7,1,"1",2,1.85714285714286 +"term-ui",0.3980651932,2.5988929786,-0.0533124701,"https://salsa.debian.org/perl-team/modules/packages/libterm-ui-perl","https://github.com/jib/term-ui.git",4487.1224074074,4,10,0,11,10,0,0,11,3,"3",1.71428571428571,1.90909090909091 +"Test-Cmd",-1.4068778673,-0.2437675076,-1.6282879603,"https://salsa.debian.org/perl-team/modules/packages/libtest-cmd-perl","https://github.com/neilb/Test-Cmd.git",4572.2283101852,1,7,0,4,6,0,0,7,3,"3",1.875,1.85714285714286 +"test-compile",-0.1757790814,2.2630567936,-0.8030738551,"https://salsa.debian.org/perl-team/modules/packages/libtest-compile-perl","https://github.com/egiles/test-compile",5567.3756018519,2,14,0,11,11,0,0,12,4,"4",1.875,1.91666666666667 +"test-corpus-audio-mpd",-2.7413583357,-1.3992673585,-3.0159490653,"https://salsa.debian.org/perl-team/modules/packages/libtest-corpus-audio-mpd-perl","http://github.com/jquelin/test-corpus-audio-mpd",904.9165856481,0,2,0,0,0,0,0,0,1,"1",2,NA +"Test-Database",-1.833809135,0.6133274632,-2.3400867988,"https://salsa.debian.org/perl-team/modules/packages/libtest-database-perl","https://github.com/book/Test-Database.git",2702.2549537037,3,2,0,5,6,0,0,9,1,"1",1.4,1.66666666666667 +"Test-File-Contents",-1.1809622978,0.4343778683,-1.4826469865,"https://salsa.debian.org/perl-team/modules/packages/libtest-file-contents-perl","https://github.com/ap/Test-File-Contents.git",4644.3475115741,2,4,0,3,8,0,0,9,3,"3",1.66666666666667,1.88888888888889 +"Test-Perl-Critic",0.2642060273,2.9016834456,-0.5237825629,"https://salsa.debian.org/perl-team/modules/packages/libtest-perl-critic-perl","https://github.com/Perl-Critic/Test-Perl-Critic.git",4634.7458449074,0,9,0,6,19,0,0,20,3,"3",2,1.95 +"Test-Pod-Coverage",-0.201777392,1.0831475883,-0.4327477008,"https://salsa.debian.org/perl-team/modules/packages/libtest-pod-coverage-perl","https://github.com/neilbowers/Test-Pod-Coverage",1677.1204166667,1,2,0,2,4,0,0,5,1,"1",1.66666666666667,1.8 +"test-prereq",-1.8896057083,-0.3676533696,-2.1546117193,"https://salsa.debian.org/perl-team/modules/packages/libtest-prereq-perl","https://github.com/briandfoy/test-prereq.git",2918.7659375,4,8,0,7,13,0,0,14,2,"2",1.66666666666667,1.92857142857143 +"Test-RDF",-1.5273740593,1.1507063443,-2.1229709088,"https://salsa.debian.org/perl-team/modules/packages/libtest-rdf-perl","https://github.com/kjetilk/Test-RDF.git",2744.0844328704,0,3,0,2,4,0,0,4,1,"1",2,2 +"Test-RedisServer",-2.9408349327,-0.0880954323,-3.6685151023,"https://salsa.debian.org/perl-team/modules/packages/libtest-redisserver-perl","https://github.com/typester/Test-RedisServer.git",3497.317025463,0,12,0,6,19,0,0,19,2,"2",2,2 +"Test-Strict",0.0413930215,1.9710003237,-0.4917254856,"https://salsa.debian.org/perl-team/modules/packages/libtest-strict-perl","https://github.com/manwar/Test-Strict.git",2362.5205092593,1,15,0,11,23,0,0,23,1,"1",1.9375,2 +"Test-XPath",-1.6970041276,0.5827254278,-2.146747561,"https://salsa.debian.org/perl-team/modules/packages/libtest-xpath-perl","https://github.com/manwar/Test-XPath.git",4673.8964699074,1,7,0,5,9,0,0,10,3,"3",1.875,1.9 +"Text-CSV_XS",0.3210443384,2.3035648179,-0.0928202393,"https://salsa.debian.org/perl-team/modules/packages/libtext-csv-xs-perl","https://github.com/Tux/Text-CSV_XS.git",5755.1094907407,9,17,0,13,37,0,0,39,4,"4",1.65384615384615,1.94871794871795 +"Text-Diff",0.3186250385,2.4917818706,-0.1685547916,"https://salsa.debian.org/perl-team/modules/packages/libtext-diff-perl","https://github.com/neilb/Text-Diff",2314.1856018519,0,6,0,3,4,0,0,4,1,"1",2,2 +"p5-Text-FindIndent",-0.5555131835,1.6711252899,-1.0083252674,"https://salsa.debian.org/perl-team/modules/packages/libtext-findindent-perl","https://github.com/tsee/p5-Text-FindIndent.git",3337.1243287037,0,6,0,2,1,0,0,2,2,"2",2,1.5 +"text-markdown",0.9343197619,4.332977055,-0.1666854375,"https://salsa.debian.org/perl-team/modules/packages/libtext-markdown-perl","https://github.com/bobtfish/text-markdown.git",2874.5088194445,0,12,0,7,40,0,0,41,2,"2",2,1.97560975609756 +"text-multimarkdown",0.2517262893,2.9301320017,-0.5540498908,"https://salsa.debian.org/perl-team/modules/packages/libtext-multimarkdown-perl","https://github.com/bobtfish/text-multimarkdown.git",2348.7609953704,0,10,0,6,15,0,0,18,1,"1",2,1.83333333333333 +"Text-Soundex",0.8131696461,4.2054082056,0.0081736989,"https://salsa.debian.org/perl-team/modules/packages/libtext-soundex-perl","https://github.com/rjbs/Text-Soundex",1152.2136342593,3,2,0,3,0,0,0,3,1,"1",1.4,1 +"perl-Text-sprintfn",-0.8179589658,2.1500712495,-1.6069534948,"https://salsa.debian.org/perl-team/modules/packages/libtext-sprintfn-perl","https://github.com/perlancar/perl-Text-sprintfn",2949.61625,0,11,0,2,2,0,0,3,2,"2",2,1.66666666666667 +"thread_pool",-0.5406636263,1.505263536,-1.0728830879,"https://salsa.debian.org/med-team/libthread-pool","https://github.com/rvaser/thread_pool",1629.2300810185,1,4,0,1,6,0,0,6,1,"1",1.8,2 +"libthumbor",-3.097994256,-0.4370183469,-3.7171702145,"https://salsa.debian.org/python-team/packages/libthumbor","https://github.com/thumbor/libthumbor",4029.2128125,6,18,0,14,40,0,7,48,3,"3",1.75,1.83333333333333 +"Tie-IxHash",0.7308735457,3.2747506675,0.0615000078,"https://salsa.debian.org/perl-team/modules/packages/libtie-ixhash-perl","https://github.com/chorny/Tie-IxHash.git",1314.8113773148,1,4,0,2,6,0,0,6,1,"1",1.8,2 +"tools.logging",-0.0293820524,2.7335220749,-0.6673515718,"https://salsa.debian.org/clojure-team/libtools-logging-clojure","https://github.com/clojure/tools.logging.git",4541.1196180556,3,16,0,7,0,0,0,7,3,"3",1.84210526315789,1 +"p5-types-datetime",-1.2224253104,1.1350772403,-1.7134370382,"https://salsa.debian.org/perl-team/modules/packages/libtypes-datetime-perl","https://github.com/tobyink/p5-types-datetime",1190.8059837963,1,4,0,3,5,0,0,5,1,"1",1.8,2 +"libunibreak",0.3910707314,2.538413373,-0.1234807159,"https://salsa.debian.org/qt-kde-team/3rdparty/libunibreak","https://github.com/adah1972/libunibreak.git",5748.0207407407,6,11,0,12,26,0,3,29,4,"4",1.64705882352941,1.89655172413793 +"libuninameslist",0.4875132738,2.4863001693,-0.0941545187,"https://salsa.debian.org/fonts-team/libuninameslist","https://github.com/fontforge/libuninameslist",5640.1865740741,5,13,0,13,19,0,0,20,4,"4",1.72222222222222,1.95 +"usbauth-all",-0.6014875746,1.9320845325,-1.2251803558,"https://salsa.debian.org/debian/libusbauth-configparser","https://github.com/kochstefan/usbauth-all.git",2917.2837384259,3,5,0,2,7,0,0,7,2,"2",1.625,2 +"vcs-lite",-0.8542886427,1.4604399952,-1.3294177339,"https://salsa.debian.org/perl-team/modules/packages/libvcs-lite-perl","http://github.com/barbie/vcs-lite",1975.3471527778,0,1,0,0,0,0,0,0,1,"1",2,NA +"libverto",2.4189536777,5.947206779,1.0158918925,"https://salsa.debian.org/debian/libverto","https://github.com/latchset/libverto",3721.9244907408,8,2,0,9,9,0,0,14,2,"2",1.2,1.64285714285714 +"libvhdi",0.6481021454,3.1352052875,-0.1671545473,"https://salsa.debian.org/pkg-security-team/libvhdi","https://github.com/libyal/libvhdi.git",3717.6224074074,1,1,0,2,16,0,2,18,2,"2",1.5,1.88888888888889 +"vitacilina",-3.6021180136,-0.769754564,-4.2924781327,"https://salsa.debian.org/perl-team/modules/packages/libvitacilina-perl","https://github.com/damog/vitacilina.git",2796.7499884259,1,5,0,4,5,0,0,6,2,"2",1.83333333333333,1.83333333333333 +"libvmdk",0.9664788559,4.388428618,-0.090886102,"https://salsa.debian.org/pkg-security-team/libvmdk","https://github.com/libyal/libvmdk.git",2936.766087963,2,1,0,3,29,0,2,31,2,"2",1.33333333333333,1.93548387096774 +"perl5-XML-Compile-WSDL11",-1.4310286216,0.7419388273,-1.8594446745,"https://salsa.debian.org/perl-team/modules/packages/libxml-compile-wsdl11-perl","https://github.com/markov2/perl5-XML-Compile-WSDL11",1204.3164351852,0,2,0,1,0,0,0,1,1,"1",2,1 +"XML-Encoding",-0.7093222742,1.489807431,-1.1875178918,"https://salsa.debian.org/perl-team/modules/packages/libxml-encoding-perl","https://github.com/steve-m-hay/XML-Encoding.git",2428.8622685185,1,1,0,1,0,0,0,1,1,"1",1.5,1 +"perl-XML-Generator",-0.4859689923,1.0279841867,-0.8301607275,"https://salsa.debian.org/perl-team/modules/packages/libxml-generator-perl","https://github.com/timlegge/perl-XML-Generator",442.0406828704,0,3,0,2,0,0,0,2,1,"1",2,1 +"XML-SAX-Expat",0.7084412925,2.9227171248,0.0786452436,"https://salsa.debian.org/perl-team/modules/packages/libxml-sax-expat-perl","https://github.com/hoehrmann/XML-SAX-Expat",2544.4844675926,0,4,0,2,2,0,0,2,1,"1",2,2 +"xml-sax-machines",-0.9628604737,0.4253404586,-1.269754049,"https://salsa.debian.org/perl-team/modules/packages/libxml-sax-machines-perl","https://github.com/perigrin/xml-sax-machines.git",1529.9486111111,1,2,0,1,2,0,0,2,1,"1",1.66666666666667,2 +"xml-sax",0.996402312,2.2577312148,0.3914828238,"https://salsa.debian.org/perl-team/modules/packages/libxml-sax-perl","https://github.com/grantm/xml-sax",3966.2573726852,0,6,0,3,4,0,0,5,3,"3",2,1.8 +"p5-xml-saxon-xslt2",-1.0066125051,2.2847267339,-1.8645802565,"https://salsa.debian.org/perl-team/modules/packages/libxml-saxon-xslt2-perl","https://github.com/tobyink/p5-xml-saxon-xslt2",1518.5208564815,0,1,0,1,2,0,0,2,1,"1",2,2 +"xmlbird",0.3929313241,3.1477652867,-0.4381392316,"https://salsa.debian.org/fonts-team/libxmlbird","https://github.com/johanmattssonm/xmlbird.git",3048.2602777778,1,7,0,6,9,0,0,9,2,"2",1.875,2 +"YAML-AppConfig",-0.2806665447,2.1538425871,-0.9966889755,"https://salsa.debian.org/perl-team/modules/packages/libyaml-appconfig-perl","https://github.com/Xaerxess/YAML-AppConfig",1551.2373611111,5,2,0,4,0,0,0,4,1,"1",1.28571428571429,1 +"libydpdict",-1.336791229,0.3110794516,-1.7407427608,"https://github.com/porridge/libydpdict","https://github.com/porridge/libydpdict",5005.9569675926,1,3,0,2,1,0,0,2,4,"4",1.75,1.5 +"libzeep",-1.527909209,-0.6468594182,-1.7548572329,"https://salsa.debian.org/med-team/libzeep","https://github.com/mhekkel/libzeep.git",5502.8286342593,2,5,0,2,10,0,0,10,4,"4",1.71428571428571,2 +"20kly",1.4342234885,4.3783383344,0.2667152562,"https://salsa.debian.org/python-team/packages/lightyears","https://github.com/20kly/20kly.git",4073.732349537,0,3,0,1,5,0,0,5,3,"3",2,2 +"lilv",0.3731954954,1.1783141026,0.0585307699,"https://salsa.debian.org/multimedia-team/lilv","https://github.com/lv2/lilv.git",5733.8443518519,8,1,0,9,44,0,0,45,4,"4",1.11111111111111,1.97777777777778 +"limereg",0.2360714075,2.909288917,-0.7247260854,"https://salsa.debian.org/science-team/limereg","https://github.com/RoelofBerg/limereg.git",1172.0418171296,0,3,0,2,6,0,0,6,1,"1",2,2 +"logtop",0.3498096662,3.7145308344,-0.5283480087,"https://github.com/JulienPalard/logtop","https://github.com/JulienPalard/logtop",3192.2077430556,0,9,0,4,8,0,0,8,2,"2",2,2 +"lolcat",0.6721262935,3.1765432052,-0.1088405445,"https://salsa.debian.org/ruby-team/lolcat","https://github.com/busyloop/lolcat.git",3767.9154513889,1,19,0,15,63,0,0,72,3,"3",1.95,1.875 +"loqui",-1.7007984788,0.6039967407,-2.1464740031,"https://salsa.debian.org/debian/loqui","https://github.com/sunnyone/loqui.git",4178.2538078704,1,9,0,3,2,0,0,3,3,"3",1.9,1.66666666666667 +"lsmount",0.241790673,3.2370471304,-0.6151908303,"https://github.com/Llandon/lsmount","https://github.com/Llandon/lsmount",2894.8834259259,1,4,0,1,3,0,0,3,2,"2",1.8,2 +"ltsp",-0.2605389691,-0.1270230433,-0.35762279,"https://github.com/ltsp/ltsp/","https://github.com/ltsp/ltsp",1481.8791782407,11,5,0,10,11,0,25,43,1,"1",1.3125,1.25581395348837 +"luadbi",0.1585813148,2.686351466,-0.4949553216,"https://salsa.debian.org/lua-team/lua-dbi","https://github.com/mwild1/luadbi",2870.1189699074,1,15,0,9,30,0,0,31,2,"2",1.9375,1.96774193548387 +"luaexpat",0.0739779286,0.7317384216,-0.0425516616,"https://salsa.debian.org/lua-team/lua-expat","https://github.com/lunarmodules/luaexpat",4256.8331365741,4,6,0,7,11,0,0,11,3,"3",1.6,2 +"linotify",-0.5779890984,2.143926952,-1.2238495501,"https://salsa.debian.org/lua-team/lua-inotify","https://github.com/hoelzro/linotify.git",2964.3124768519,3,9,0,8,16,0,0,18,2,"2",1.75,1.88888888888889 +"lualdap",0.0504029107,1.7349223597,-0.4425312123,"https://salsa.debian.org/lua-team/lua-ldap","https://github.com/lualdap/lualdap.git",4408.7069791667,7,12,0,13,25,0,0,30,3,"3",1.63157894736842,1.83333333333333 +"say",0.0600475565,3.4355060639,-0.8262923484,"https://salsa.debian.org/lua-team/lua-say","https://github.com/lunarmodules/say.git",4008.0407638889,1,11,0,8,11,0,0,11,3,"3",1.91666666666667,2 +"lyaml",-0.3454983994,1.9583709762,-0.7980928636,"https://salsa.debian.org/lua-team/lua-yaml/","https://github.com/gvvaughan/lyaml",3607.2911111111,1,7,1,6,63,0,0,63,2,"2",1.875,2 +"lunar-date",-1.0901325066,-0.0609883227,-1.3741924046,"https://salsa.debian.org/chinese-team/lunar-date","https://github.com/yetist/lunar-date",5400.1525115741,1,8,0,2,12,0,0,12,4,"4",1.88888888888889,2 +"luola",-0.2736280431,0.4554221137,-0.5709254832,"https://salsa.debian.org/debian/luola","https://github.com/callaa/luola.git",0.009537037,0,1,0,1,2,0,0,3,1,"1",2,1.66666666666667 +"lv2file",0.6267118175,3.5316112473,-0.3364614164,"https://salsa.debian.org/multimedia-team/lv2file","https://github.com/jeremysalwen/lv2file.git",4139.5358449074,2,9,0,4,7,0,0,9,3,"3",1.81818181818182,1.77777777777778 +"lwt",-0.134408789,0.9137216874,-0.5254639396,"https://salsa.debian.org/ocaml-team/lwt","https://github.com/ocsigen/lwt.git",5681.6560300926,82,99,0,111,0,0,0,111,4,"4",1.54696132596685,1 +"lxappearance",2.8189754808,5.1307581038,1.6743807599,"https://salsa.debian.org/lxde-team/lxappearance","https://github.com/lxde/lxappearance.git",4801.901712963,111,38,0,71,12,0,0,76,3,"3",1.25503355704698,1.15789473684211 +"lxsession",1.2116112613,1.9433064205,0.7300432073,"https://salsa.debian.org/lxde-team/lxsession","https://github.com/lxde/lxsession.git",5699.8882175926,92,44,0,68,24,0,0,80,4,"4",1.32352941176471,1.3 +"lz4json",-0.4492537171,1.9714794785,-0.9639366883,"https://github.com/kilobyte/lz4json/tree/debian","https://github.com/kilobyte/lz4json",1639.7853125,4,5,0,5,0,0,0,5,1,"1",1.55555555555556,1 +"mac-fdisk-debian",2.7880780441,5.7864461789,1.4460748362,"https://github.com/glaubitz/mac-fdisk-debian","https://github.com/glaubitz/mac-fdisk-debian",0.0261342593,1,1,0,1,1,0,0,2,1,"1",1.5,1.5 +"MACTelnet-Debian-Packaging",0.2259589335,2.9645776481,-0.5410252908,"https://github.com/haakonnessjoen/MACTelnet-Debian-Packaging","https://github.com/haakonnessjoen/MACTelnet-Debian-Packaging",1885.9548726852,0,3,0,1,3,0,0,3,1,"1",2,2 +"madwimax",0.5386816454,4.8433430858,-0.9450458426,"http://github.com/ago/madwimax","http://github.com/ago/madwimax",1040.9560532407,1,3,0,0,0,0,0,0,1,"1",1.75,NA +"magicrescue",0.5638588917,1.9092658203,-0.0393062113,"https://salsa.debian.org/pkg-security-team/magicrescue","https://github.com/jbj/magicrescue",1064.0338194445,1,3,0,2,2,0,0,2,1,"1",1.75,2 +"magit-popup",0.2571268821,2.5085186003,-0.2260041619,"https://salsa.debian.org/emacsen-team/magit-popup","https://github.com/magit/magit-popup.git",3610.5775925926,17,32,0,43,14,0,0,53,2,"2",1.6530612244898,1.26415094339623 +"emacsen-team",-0.9153485178,0.2878604704,-1.1484533672,"https://salsa.debian.org/emacsen-team/magithub","https://salsa.debian.org/emacsen-team/magithub",1074.2872569445,13,18,0,0,0,0,0,0,1,"1",1.58064516129032,NA +"mando",-0.8468044385,1.2154767785,-1.3465386928,"https://salsa.debian.org/python-team/packages/mando","https://github.com/rubik/mando.git",3495.7249768519,7,5,0,9,21,0,0,21,2,"2",1.41666666666667,2 +"manpages-zh",0.3013864409,1.4801748551,-0.1366673269,"https://salsa.debian.org/chinese-team/manpages-zh","https://github.com/man-pages-zh/manpages-zh",5615.6429976852,2,12,2,8,40,0,0,44,4,"4",1.85714285714286,1.90909090909091 +"manuel",-1.8188927476,0.9170806837,-2.5490910041,"https://salsa.debian.org/python-team/packages/manuel","https://github.com/benji-york/manuel",5520.6818171296,2,23,0,16,26,0,0,29,4,"4",1.92,1.89655172413793 +"marisa-trie",-0.2770059581,0.4130762278,-0.5523788144,"https://salsa.debian.org/input-method-team/marisa","https://github.com/s-yata/marisa-trie.git",1648.6119675926,1,9,0,7,42,0,0,42,1,"1",1.9,2 +"mate-backgrounds",0.5159356315,3.1381456756,-0.0659273196,"https://salsa.debian.org/debian-mate-team/mate-backgrounds","https://github.com/mate-desktop/mate-backgrounds.git",4154.5609837963,7,18,0,16,26,0,0,30,3,"3",1.72,1.86666666666667 +"mate-user-guide",0.5094536603,3.3401486345,-0.0704353393,"https://salsa.debian.org/debian-mate-team/mate-user-guide","https://github.com/mate-desktop/mate-user-guide.git",2933.2399768519,5,16,0,11,19,0,0,21,2,"2",1.76190476190476,1.9047619047619 +"mate-user-share",-0.0144878955,0.7287904866,-0.2142966004,"https://salsa.debian.org/debian-mate-team/mate-user-share","https://github.com/mate-desktop/mate-user-share.git",4144.6895601852,7,22,0,16,27,0,0,29,3,"3",1.75862068965517,1.93103448275862 +"mate-window-applets",-0.186625862,1.9636663587,-0.6313160521,"https://salsa.debian.org/debian-mate-team/mate-window-applets","https://github.com/ubuntu-mate/mate-window-applets.git",1140.5334375,6,3,0,6,20,0,0,20,1,"1",1.33333333333333,2 +"materia-theme",0.1045234392,1.9891123795,-0.3220563371,"https://salsa.debian.org/desktop-themes-team/materia-gtk-theme","https://github.com/nana-4/materia-theme/commits/master",5185.326875,55,11,0,0,0,0,0,0,4,"4",1.16666666666667,NA +"maybe",-0.652177661,1.9314993227,-1.1686602213,"https://salsa.debian.org/debian/maybe","https://github.com/p-e-w/maybe",363.7199652778,0,2,1,2,60,0,0,60,1,"1",2,2 +"marionette-collective",0.2172201034,1.7225219851,-0.4315505666,"https://salsa.debian.org/puppet-team/mcollective","https://github.com/puppetlabs/marionette-collective",3620.6848148148,74,101,0,96,3,0,0,99,2,"2",1.57714285714286,1.03030303030303 +"meanwhile",1.6225494468,3.5813327858,0.7214154539,"https://salsa.debian.org/debian/meanwhile","https://github.com/obriencj/meanwhile.git",352.0019560185,1,1,0,2,2,0,0,3,1,"1",1.5,1.66666666666667 +"medusa",0.7418834796,1.8416337033,0.1473000467,"https://salsa.debian.org/pkg-security-team/medusa","https://github.com/jmk-foofus/medusa",2618.4448032407,4,10,0,10,71,0,0,71,1,"1",1.71428571428571,2 +"memkind",-2.3338755247,-0.4330380435,-2.7754873055,"https://github.com/kilobyte/memkind/tree/debian","https://github.com/kilobyte/memkind",3438.6727199074,30,85,0,50,2,0,0,52,2,"2",1.73913043478261,1.03846153846154 +"memtest86plus",2.2601852863,3.3021289749,1.5576924368,"https://salsa.debian.org/debian/memtest86plus","https://github.com/memtest86plus/memtest86plus.git",663.5358564815,15,10,0,12,7,0,0,15,1,"1",1.4,1.46666666666667 +"mercator",-0.2340868407,1.6571874232,-0.993372484,"https://salsa.debian.org/games-team/mercator","https://github.com/worldforge/mercator",5633.2390393519,0,7,0,5,5,0,0,7,4,"4",2,1.71428571428571 +"minidb",-0.4525684191,1.7891094238,-0.9018820656,"https://salsa.debian.org/mwerlen/minidb","https://github.com/thp/minidb.git",4339.2984953704,2,5,0,6,13,0,0,13,3,"3",1.71428571428571,2 +"minieigen",-0.2097696756,0.7860654925,-0.499567475,"https://salsa.debian.org/science-team/minieigen","https://github.com/eudoxos/minieigen",4093.4507523148,0,12,0,7,18,0,0,18,3,"3",2,2 +"minisat",0.081865083,0.8637917657,-0.1532386767,"http://github.com/niklasso/minisat","http://github.com/niklasso/minisat",2028.9114699074,1,5,0,0,0,0,0,0,1,"1",1.83333333333333,NA +"mkalias",-0.7408475157,2.3071375002,-1.5762128281,"https://salsa.debian.org/ruby-team/mkalias","https://github.com/LucianoPC/mkalias",68.2117476852,0,3,0,2,2,0,0,3,1,"1",2,1.66666666666667 +"mktorrent",0.2711814394,1.9101515608,-0.3158320018,"https://salsa.debian.org/debian/mktorrent","https://github.com/pobrn/mktorrent",4360.041099537,6,10,1,14,72,0,4,77,3,"3",1.625,1.93506493506494 +"mmtf-java",-5.037602316,-2.8514886182,-5.4781542553,"https://salsa.debian.org/debichem-team/mmtf-java","https://github.com/rcsb/mmtf-java.git",2412.8476967593,1,12,0,6,13,0,0,13,1,"1",1.92307692307692,2 +"mmv",1.5597347679,2.9419260396,0.7739885392,"https://salsa.debian.org/debian/mmv","https://github.com/rrthomas/mmv.git",971.7580902778,1,1,0,2,10,0,0,10,1,"1",1.5,2 +"mod_proxy_msrpc",-0.4686771794,2.4036030859,-1.2427083432,"https://github.com/bombadil/mod_proxy_msrpc/tree/debian/unstable","https://github.com/bombadil/mod_proxy_msrpc",805.3717013889,0,4,0,1,20,0,1,21,1,"1",2,1.95238095238095 +"modem-cmd",-0.6052898943,1.7555013841,-1.1587030212,"https://salsa.debian.org/debian/modem-cmd","https://github.com/imZack/modem-cmd.git",939.0309143519,1,4,0,2,5,0,0,5,1,"1",1.8,2 +"modplug-tools",0.4632988211,2.9493569553,-0.4712506177,"https://salsa.debian.org/multimedia-team/modplugtools","https://github.com/alexmyczko/modplug-tools",1743.9280324074,2,5,0,3,4,0,0,4,1,"1",1.71428571428571,2 +"mom",-0.6777849161,1.9853085783,-1.5072869412,"https://salsa.debian.org/debian/mom","https://github.com/oVirt/mom",4972.7826157407,31,16,1,25,13,0,0,31,3,"3",1.34042553191489,1.41935483870968 +"mongo-c-driver",0.3915954735,1.6519342417,-0.0863313883,"https://github.com/mongodb/mongo-c-driver/tree/master","https://github.com/mongodb/mongo-c-driver",5226.5267939815,106,124,0,112,0,0,0,112,4,"4",1.53913043478261,1 +"montage-wrapper",-0.3865274729,1.1809812531,-0.6680117033,"https://salsa.debian.org/debian-astro-team/montage-wrapper","https://github.com/astropy/montage-wrapper",3566.7960416667,2,16,3,14,39,0,0,42,2,"2",1.88888888888889,1.92857142857143 +"mopidy-alsamixer",-0.098708743,2.9303656044,-0.8810971993,"https://salsa.debian.org/mopidy-team/mopidy-alsamixer","https://github.com/mopidy/mopidy-alsamixer",3286.4480439815,1,5,0,5,39,0,0,39,2,"2",1.83333333333333,2 +"mopidy-beets",-0.6046887672,2.3676499619,-1.3922973554,"https://salsa.debian.org/mopidy-team/mopidy-beets","https://github.com/mopidy/mopidy-beets",3887.5415162037,2,10,0,7,27,0,0,27,3,"3",1.83333333333333,2 +"mopidy-dleyna",-0.6150387258,1.8626619639,-1.276416264,"https://salsa.debian.org/mopidy-team/mopidy-dleyna","https://github.com/tkem/mopidy-dleyna.git",2554.9614351852,1,6,0,4,25,0,0,25,1,"1",1.85714285714286,2 +"mp3wrap",0.1511883249,2.4047625906,-0.4072551552,"https://github.com/marciosouza20/mp3wrap.git","https://github.com/marciosouza20/mp3wrap.git",36.6266319444,0,2,0,1,0,0,0,1,1,"1",2,1 +"mpc123",0.851583608,3.5692284528,-0.2366259159,"https://salsa.debian.org/debian/mpc123","https://github.com/bucciarati/mpc123",4095.7045717593,0,4,0,1,2,0,0,2,3,"3",2,2 +"mpdscribble",-0.7233101544,-0.5981438455,-0.7658816633,"https://salsa.debian.org/mpd-team/mpdscribble","https://github.com/MusicPlayerDaemon/mpdscribble.git",5474.3595486111,22,17,0,29,73,0,0,90,4,"4",1.43589743589744,1.81111111111111 +"mruby",-1.5514391,-1.3019492907,-1.6243857492,"https://github.com/mruby-debian/mruby","https://github.com/mruby-debian/mruby",4156.8421527778,37,353,0,255,2,0,32,288,3,"3",1.9051282051282,1.00694444444444 +"msgpuck",-1.9345101796,0.7538606408,-2.5762644187,"https://github.com/rtsisyk/msgpuck","https://github.com/rtsisyk/msgpuck",1946.1415046296,3,13,1,11,15,0,0,21,1,"1",1.8125,1.71428571428571 +"msitools",0.9685786476,3.4437444916,0.0488138918,"https://salsa.debian.org/debian/msitools","https://github.com/GNOME/msitools",4016.1692361111,45,59,0,69,4,0,0,71,3,"3",1.56730769230769,1.05633802816901 +"mt-st",0.1082142752,0.6983439611,-0.1608193497,"https://salsa.debian.org/debian/mt-st","https://github.com/iustin/mt-st",3093.7365972222,14,5,0,10,19,0,0,20,2,"2",1.26315789473684,1.95 +"mtpolicyd",-1.3311506647,1.0954039333,-1.9915905372,"https://salsa.debian.org/debian/mtpolicyd","https://github.com/benningm/mtpolicyd.git",2186.9926157407,1,4,0,3,21,0,0,21,1,"1",1.8,2 +"mtree-netbsd",-1.5216638363,0.5725600433,-2.0355608409,"https://github.com/jgoerzen/mtree-netbsd","https://github.com/jgoerzen/mtree-netbsd",1538.1956712963,1,7,0,0,1,0,0,1,1,"1",1.875,2 +"MU-CITE",-0.9256165282,0.9613021982,-1.3098678212,"https://salsa.debian.org/debian/mu-cite","https://github.com/cvs-m17n-org/MU-CITE",4190.5202430556,2,3,0,4,3,0,0,5,3,"3",1.6,1.6 +"mudita24",-0.0566417905,1.5271069455,-0.4568909604,"https://salsa.debian.org/multimedia-team/mudita24","https://github.com/NielsMayer/mudita24",2005.0215046296,0,5,0,2,9,0,0,11,1,"1",2,1.81818181818182 +"mugshot",0.7316630016,2.7960037279,-0.1554059373,"https://salsa.debian.org/python-team/packages/mugshot","https://github.com/bluesabre/mugshot",3560.1744907408,3,9,0,7,25,0,1,28,2,"2",1.75,1.89285714285714 +"mupen64plus-video-glide64",0.1160309114,2.3242018271,-0.3185351881,"https://salsa.debian.org/games-team/mupen64plus-video-glide64","https://github.com/mupen64plus/mupen64plus-video-glide64",4871.8438310185,2,17,0,10,7,0,0,11,3,"3",1.89473684210526,1.63636363636364 +"mupen64plus-video-z64",-0.0630178119,1.307530126,-0.3263531841,"https://salsa.debian.org/games-team/mupen64plus-video-z64","https://github.com/mupen64plus/mupen64plus-video-z64",4885.8515046296,2,17,0,10,9,0,0,12,3,"3",1.89473684210526,1.75 +"muse",0.9834892976,2.8604314623,0.0726359102,"https://salsa.debian.org/emacsen-team/muse-el","https://github.com/alexott/muse",5662.6274884259,5,7,0,9,14,0,0,76,4,"4",1.58333333333333,1.18421052631579 +"mwrap",-0.6055213344,1.7500683415,-1.3620779276,"https://salsa.debian.org/pkg-octave-team/mwrap","https://github.com/zgimbutas/mwrap",3042.6040856482,0,5,0,3,5,0,0,5,2,"2",2,2 +"nasty",1.7398622788,6.040628791,0.3559757417,"https://salsa.debian.org/pkg-security-team/nasty","https://github.com/folkertvanheusden/nasty",2093.1121412037,0,4,0,2,1,0,0,3,1,"1",2,1.33333333333333 +"natsort",0.2307395007,2.1095787345,-0.2397860986,"https://salsa.debian.org/python-team/packages/natsort","https://github.com/SethMMorton/natsort.git",4065.0547106482,9,17,0,19,20,0,1,38,3,"3",1.65384615384615,1.52631578947368 +"repairer",0.924989159,3.2280109324,0.0005519878,"https://salsa.debian.org/l10n-korean-team/nautilus-filename-repairer","https://github.com/choehwanjin/repairer",2878.1959953704,0,1,0,1,3,0,1,4,2,"2",2,1.75 +"nb2plots",-1.170670669,1.5589366654,-1.743374148,"https://salsa.debian.org/python-team/packages/nb2plots","https://github.com/matthew-brett/nb2plots.git",2904.4454282408,2,7,0,6,21,0,0,22,2,"2",1.77777777777778,1.95454545454545 +"nbtscan",0.2989992596,1.090810849,-0.0722586258,"https://salsa.debian.org/pkg-security-team/nbtscan","https://github.com/resurrecting-open-source-projects/nbtscan",1167.6364699074,1,3,0,3,5,0,0,5,1,"1",1.75,2 +"ncbi-vdb",-0.6569361569,-0.2675890873,-0.7753516055,"https://salsa.debian.org/med-team/ncbi-vdb","https://github.com/ncbi/ncbi-vdb",3367.922349537,2,70,0,18,30,0,5,46,2,"2",1.97222222222222,1.65217391304348 +"ncompress",0.6360276236,1.8663344659,0.0985497423,"https://salsa.debian.org/debian/ncompress","https://github.com/vapier/ncompress.git",4740.1165856482,11,4,0,11,22,0,0,23,3,"3",1.26666666666667,1.95652173913043 +"ndctl",-0.3026771532,0.473161469,-0.4939488737,"https://github.com/kilobyte/ndctl/tree/debian","https://github.com/kilobyte/ndctl",3210.1365509259,74,5,0,51,3,0,0,54,2,"2",1.06329113924051,1.05555555555556 +"ndg_httpsclient",0.1546655272,1.0783288299,-0.0773848973,"https://salsa.debian.org/debian/ndg-httpsclient","https://github.com/cedadev/ndg_httpsclient",3360.0136342593,2,11,0,6,22,0,0,22,2,"2",1.84615384615385,2 +"neard-deb",0.5311444679,4.0953604611,-0.5296646663,"https://github.com/sameo/neard-deb","https://github.com/sameo/neard-deb",1126.7503587963,0,4,0,2,2,0,0,2,1,"1",2,2 +"neartree",-0.0269486668,2.399314564,-0.5366245779,"https://salsa.debian.org/science-team/neartree","https://github.com/yayahjb/neartree",4773.070625,0,3,0,2,2,0,0,3,3,"3",2,1.66666666666667 +"neko-debian",-0.3476116673,0.4024674223,-0.6520598063,"https://github.com/HaxeFoundation/neko-debian","https://github.com/HaxeFoundation/neko-debian",5577.6636111111,6,3,0,5,2,0,0,7,4,"4",1.33333333333333,1.28571428571429 +"neomutt",1.0660685693,2.7351403402,0.2935299788,"https://salsa.debian.org/mutt-team/neomutt","https://github.com/neomutt/neomutt",5650.5290625,268,117,0,322,9,0,0,326,4,"4",1.3038961038961,1.02760736196319 +"netconsole",-1.2200873308,0.812746843,-1.6449255455,"https://salsa.debian.org/debian/netconsole","https://github.com/ionos-cloud/netconsole",558.8093865741,0,1,0,1,2,0,0,2,1,"1",2,2 +"nfoview",-0.0498945429,1.6663964244,-0.6736195708,"https://salsa.debian.org/python-team/packages/nfoview","https://github.com/otsaloma/nfoview",5657.3754861111,14,5,0,10,8,0,0,13,4,"4",1.26315789473684,1.61538461538462 +"nfstrace",0.7169141553,2.6489983997,-0.0935466194,"https://salsa.debian.org/debian/nfstrace","https://github.com/epam/nfstrace",2137.7810300926,9,42,0,16,32,0,0,38,1,"1",1.82352941176471,1.84210526315789 +"nifti2dicom",-0.1186607259,1.299142347,-0.6903266138,"https://salsa.debian.org/med-team/nifti2dicom","https://github.com/biolab-unige/nifti2dicom.git",2963.0766898148,0,2,0,2,17,0,0,17,2,"2",2,2 +"ninka",-1.2427926984,1.0338618531,-1.6842246523,"https://salsa.debian.org/debian/ninka","https://github.com/dmgerman/ninka",4166.3812268519,0,17,0,10,27,0,0,27,3,"3",2,2 +"nload",0.6920286572,1.9662038736,0.1248983732,"https://github.com/marciosouza20/nload.git","https://github.com/marciosouza20/nload.git",5.8634143519,0,1,0,1,0,0,0,1,1,"1",2,1 +"nm-tray",0.2402419984,2.9899186351,-0.4509695416,"https://salsa.debian.org/lxqt-team/nm-tray","https://github.com/palinek/nm-tray.git",2973.3749074074,57,7,0,43,49,0,0,80,2,"2",1.109375,1.6125 +"nocache",0.6323720855,2.8803006592,-0.068529056,"https://salsa.debian.org/debian/nocache","https://github.com/Feh/nocache",3331.9030902778,2,12,0,11,42,0,0,42,2,"2",1.85714285714286,2 +"nodau",-1.5991809833,-0.3805538345,-1.905798655,"https://salsa.debian.org/carnil/nodau","https://github.com/TicklishHoneyBee/nodau",4073.1802662037,2,7,0,3,6,0,0,6,3,"3",1.77777777777778,2 +"abbrev-js",0.3167225092,2.5424116289,-0.1165089261,"https://salsa.debian.org/js-team/node-abbrev","https://github.com/npm/abbrev-js",5021.0522106482,6,4,0,8,4,0,0,12,4,"4",1.4,1.33333333333333 +"node-active-x-obfuscator",-1.7102077451,0.4939822957,-2.1488227767,"https://salsa.debian.org/js-team/node-active-x-obfuscator","https://github.com/felixge/node-active-x-obfuscator.git",979.9255902778,0,5,0,3,0,0,0,3,1,"1",2,1 +"address",-2.3512829732,-0.2296492891,-2.7851879565,"https://salsa.debian.org/js-team/node-address","https://github.com/node-modules/address.git",3756.5830208333,7,6,0,10,40,0,0,41,2,"2",1.46153846153846,1.97560975609756 +"ansi.js",0.651738311,3.3801423506,-0.0622958722,"https://salsa.debian.org/js-team/node-ansi","https://github.com/TooTallNate/ansi.js.git",2003.1949884259,2,6,0,6,9,0,0,13,1,"1",1.75,1.69230769230769 +"applause",-2.6025031313,0.0354812349,-3.2768862018,"https://salsa.debian.org/js-team/node-applause","https://github.com/outatime/applause.git",2600.1592592593,1,6,0,4,30,0,0,30,1,"1",1.85714285714286,2 +"node-cross-spawn-async",-0.4789307226,0.5287764974,-0.6568563161,"https://salsa.debian.org/js-team/node-cross-spawn-async","https://github.com/IndigoUnited/node-cross-spawn-async.git",674.7693981481,1,12,0,8,0,0,0,8,1,"1",1.92307692307692,1 +"CSSStyleDeclaration",0.0239557668,3.7882296404,-1.1998721983,"https://salsa.debian.org/js-team/node-cssstyle","https://github.com/chad3814/CSSStyleDeclaration.git",2137.4537037037,0,9,0,5,0,0,0,5,1,"1",2,1 +"d3-color",-0.5677058758,2.345342576,-1.264606113,"https://salsa.debian.org/js-team/node-d3-color","https://github.com/d3/d3-color",3047.9240046296,6,8,0,11,41,0,0,44,2,"2",1.57142857142857,1.93181818181818 +"node-dashdash",0.812623388,3.8026107021,-0.0104465219,"https://salsa.debian.org/js-team/node-dashdash","https://github.com/trentm/node-dashdash",3657.7330671296,5,4,0,5,28,0,0,28,2,"2",1.44444444444444,2 +"node-deep-extend",0.3074384175,2.5963720517,-0.1256934881,"https://salsa.debian.org/js-team/node-deep-extend","https://github.com/unclechu/node-deep-extend.git",2469.0779513889,2,14,0,9,1,0,0,9,1,"1",1.875,1.11111111111111 +"dryice",-1.6777851216,0.5009822025,-2.1440213388,"https://salsa.debian.org/js-team/node-dryice","https://github.com/mozilla/dryice",1261.6348842593,1,13,0,12,13,0,0,17,1,"1",1.92857142857143,1.76470588235294 +"node-errno",0.7419951798,3.986012183,-0.0698570252,"https://salsa.debian.org/js-team/node-errno","https://github.com/rvagg/node-errno",3152.3664699074,3,11,0,11,31,0,0,31,2,"2",1.78571428571429,2 +"node-error-ex",-0.1994307651,1.9233568792,-0.6268261848,"https://salsa.debian.org/js-team/node-error-ex","https://github.com/qix-/node-error-ex.git",1448.5513425926,4,8,0,5,25,0,0,25,1,"1",1.66666666666667,2 +"node-extend",0.7004129328,3.6122581892,-0.0527431497,"https://salsa.debian.org/js-team/node-extend","https://github.com/justmoon/node-extend",4212.296400463,1,15,0,13,1,0,0,13,3,"3",1.9375,1.07692307692308 +"extend-shallow",-0.1006921362,1.3927484709,-0.3636715364,"https://salsa.debian.org/js-team/node-extend-shallow","https://github.com/jonschlinkert/extend-shallow",1170.6065046296,0,5,0,3,4,0,0,4,1,"1",2,2 +"file-entry-cache",-0.7855336157,1.967354907,-1.5011474598,"https://salsa.debian.org/js-team/node-file-entry-cache","https://github.com/royriojas/file-entry-cache.git",3181.5545138889,1,11,0,7,28,0,0,28,2,"2",1.91666666666667,2 +"node-findit",-0.2051260072,2.7355493581,-1.1209208962,"https://salsa.debian.org/js-team/node-findit2","https://github.com/andrewrk/node-findit.git",1811.4445601852,1,5,0,4,4,0,0,6,1,"1",1.83333333333333,1.66666666666667 +"fined",-0.1637425394,2.1242452034,-0.5982871995,"https://salsa.debian.org/js-team/node-fined","https://github.com/js-cli/fined",1982.8433680556,5,3,0,4,10,0,0,10,1,"1",1.375,2 +"node-form-data",0.5074076179,3.0343874901,-0.0886742861,"https://salsa.debian.org/js-team/node-form-data","https://github.com/felixge/node-form-data.git",3563.1111111111,9,36,0,35,5,0,0,36,2,"2",1.8,1.13888888888889 +"node-fresh",-0.3450557311,2.0039913503,-0.81124946,"https://salsa.debian.org/js-team/node-fresh","https://github.com/visionmedia/node-fresh.git",3886.7925231482,11,3,0,12,37,0,0,37,3,"3",1.21428571428571,2 +"is-npm",0.9785051776,4.5008052167,0.0095997285,"https://salsa.debian.org/js-team/node-is-npm","https://github.com/sindresorhus/is-npm",2619.0418634259,7,2,0,7,17,0,0,17,1,"1",1.22222222222222,2 +"is-typedarray",0.3980978816,2.528720541,-0.0976776715,"https://salsa.debian.org/js-team/node-is-typedarray","https://github.com/hughsk/is-typedarray",349.2442476852,0,2,0,2,14,0,0,14,1,"1",2,2 +"isexe",0.3099265646,2.6155667478,-0.1218258686,"https://salsa.debian.org/js-team/node-isexe","https://github.com/isaacs/isexe",2832.2716319445,1,4,0,1,26,0,0,26,2,"2",1.8,2 +"Jed",0.9307464408,4.5334423493,-0.0663016053,"https://salsa.debian.org/js-team/node-jed","https://github.com/messageformat/Jed.git",1857.5029166667,3,19,0,18,61,0,0,61,1,"1",1.86363636363636,2 +"jsesc",0.1478102512,3.2506359357,-0.5098361018,"https://salsa.debian.org/js-team/node-jsesc","https://github.com/mathiasbynens/jsesc",2702.1588310185,6,3,0,8,44,0,0,44,1,"1",1.33333333333333,2 +"JSON.minify",-0.1691871793,2.0408856828,-0.6162694158,"https://salsa.debian.org/js-team/node-jsonminify","https://github.com/fkei/JSON.minify",3001.0353819445,2,9,0,8,17,0,0,18,2,"2",1.81818181818182,1.94444444444444 +"JSONSelect",0.5601821689,4.3158830877,-0.4551619485,"https://salsa.debian.org/js-team/node-jsonselect","https://github.com/lloyd/JSONSelect",984.9768287037,2,8,0,8,38,0,0,39,1,"1",1.8,1.97435897435897 +"knockout",-1.6817262176,0.9748888004,-2.3144504112,"https://salsa.debian.org/js-team/node-knockout","https://github.com/knockout/knockout.git",4081.7972685185,20,115,0,81,45,0,125,241,3,"3",1.85185185185185,1.18672199170124 +"lastfm-node",-0.2802502576,3.2316861272,-1.2092934746,"https://salsa.debian.org/js-team/node-lastfm","https://github.com/jammus/lastfm-node",4644.4506018519,2,11,2,9,28,0,0,28,3,"3",1.84615384615385,2 +"node-macaddress",-2.3578089542,0.3286344876,-2.9837856086,"https://salsa.debian.org/js-team/node-macaddress","https://github.com/scravy/node-macaddress",2961.7712268519,5,13,0,12,73,0,0,73,2,"2",1.72222222222222,2 +"map-visit",0.0602654466,2.3400984295,-0.3823836028,"https://salsa.debian.org/js-team/node-map-visit","https://github.com/jonschlinkert/map-visit",645.0525115741,0,3,0,2,3,0,0,4,1,"1",2,1.75 +"media-typer",-0.1314554385,2.3567183276,-0.7554351148,"https://salsa.debian.org/js-team/node-media-typer","https://github.com/expressjs/media-typer.git",2488.2450925926,1,1,0,2,14,0,0,14,1,"1",1.5,2 +"merge-descriptors",-0.2368061411,2.2901222412,-0.8069774958,"https://salsa.debian.org/js-team/node-merge-descriptors","https://github.com/component/merge-descriptors.git",3669.9310532407,3,3,0,6,17,0,0,17,2,"2",1.5,2 +"node-mess",-0.2872327671,3.3046798368,-1.2179833072,"https://salsa.debian.org/js-team/node-mess","https://github.com/bobrik/node-mess",420.8625578704,0,3,0,2,2,0,0,2,1,"1",2,2 +"minimist",0.3063916948,2.5263654362,-0.1223643827,"https://salsa.debian.org/js-team/node-minimist","https://github.com/minimistjs/minimist.git",3791.1307175926,12,9,0,15,32,0,0,43,3,"3",1.42857142857143,1.74418604651163 +"mixin-deep",0.2041015905,2.301231867,-0.3460970033,"https://salsa.debian.org/js-team/node-mixin-deep","https://github.com/jonschlinkert/mixin-deep.git",1736.2018171296,0,4,0,2,14,0,0,14,1,"1",2,2 +"node-mocks-http",-1.7138454453,1.129012054,-2.4238704392,"https://salsa.debian.org/js-team/node-mocks-http","https://github.com/howardabrams/node-mocks-http",4315.2549074074,38,62,0,71,2,0,0,72,3,"3",1.62,1.02777777777778 +"repeat-element",0.0303018925,2.2050520215,-0.399164761,"https://salsa.debian.org/js-team/node-repeat-element","https://github.com/jonschlinkert/repeat-element",2277.9809027778,1,7,0,3,6,0,0,6,1,"1",1.875,2 +"semver-diff",0.3257088663,2.53870067,-0.1250464411,"https://salsa.debian.org/js-team/node-semver-diff","https://github.com/sindresorhus/semver-diff",2556.954525463,4,3,0,6,11,0,0,11,1,"1",1.42857142857143,2 +"node-simple-swizzle",-3.3828108141,-1.5319435267,-3.7510526278,"https://salsa.debian.org/js-team/node-simple-swizzle","https://github.com/qix-/node-simple-swizzle",2271.2482060185,1,3,0,1,3,0,0,3,1,"1",1.75,2 +"snapdragon",0.0374783954,2.1244720905,-0.3853126603,"https://salsa.debian.org/js-team/node-snapdragon","https://github.com/jonschlinkert/snapdragon.git",2160.5059722222,3,7,0,4,43,0,0,43,1,"1",1.7,2 +"ssri",0.4331740134,2.8578668337,-0.1107367526,"https://salsa.debian.org/js-team/node-ssri","https://github.com/zkat/ssri.git",2084.4809606482,2,3,0,2,27,0,0,27,1,"1",1.6,2 +"starttls",-3.2028271629,0.3123776454,-4.1656333947,"https://salsa.debian.org/js-team/node-starttls","https://github.com/mattcg/starttls",960.3696643519,0,1,0,1,4,0,0,4,1,"1",2,2 +"string_decoder",0.4324513521,3.0006538783,-0.1138855604,"https://salsa.debian.org/js-team/node-string-decoder","https://github.com/nodejs/string_decoder.git",2072.5483449074,4,7,0,8,9,0,0,12,1,"1",1.63636363636364,1.75 +"test-commonjs",-1.1865527924,1.2057642216,-1.6221327583,"https://salsa.debian.org/js-team/node-test","https://github.com/Gozala/test-commonjs",826.1617476852,0,3,0,1,16,0,0,16,1,"1",2,2 +"timed-out",0.534083437,2.8184506266,-0.0696353825,"https://salsa.debian.org/js-team/node-timed-out","https://github.com/floatdrop/timed-out",2343.4748726852,6,7,0,8,28,0,0,28,1,"1",1.53846153846154,2 +"nodeenv",-0.6570648957,1.4812327857,-1.14641203,"https://github.com/chriskuehl/nodeenv","https://github.com/chriskuehl/nodeenv",2128.7291782408,1,53,0,38,2,0,0,40,1,"1",1.98148148148148,1.05 +"nomacs",-0.1195252619,0.4799728253,-0.3176324087,"https://salsa.debian.org/lxqt-team/nomacs","https://github.com/nomacs/nomacs/commits/master",5185.326875,55,11,0,0,0,0,0,0,4,"4",1.16666666666667,NA +"nomnom",0.4452914343,2.9402706663,-0.3322295975,"https://github.com/mogaal/nomnom","https://github.com/mogaal/nomnom",917.9151273148,0,2,0,1,0,0,0,1,1,"1",2,1 +"nordlicht",-0.4190840106,1.2017878417,-0.7274544195,"https://salsa.debian.org/multimedia-team/nordlicht","https://github.com/nordlicht/nordlicht",1854.1766087963,0,8,0,6,13,0,0,13,1,"1",2,2 +"norm",0.0395894571,0.5725879857,-0.0372679262,"https://salsa.debian.org/debian/norm","https://github.com/USNavalResearchLaboratory/norm",1453.1532523148,10,9,0,11,11,0,1,19,1,"1",1.47368421052632,1.57894736842105 +"notmuch-addrlookup-c",-0.5765143279,1.1877508137,-1.0148913081,"https://salsa.debian.org/debian/notmuch-addrlookup","https://github.com/aperezdc/notmuch-addrlookup-c",3177.0368287037,9,8,0,14,28,0,0,28,2,"2",1.47058823529412,2 +"nsca-ng",-0.5633658512,0.8404353755,-1.1288671432,"https://salsa.debian.org/nagios-team/nsca-ng","https://github.com/weiss/nsca-ng.git",3817.9714236111,3,6,0,5,6,0,0,9,3,"3",1.66666666666667,1.66666666666667 +"nsnake.debian",0.294306693,3.1180145865,-0.512619257,"https://github.com/alexdantas/nsnake.debian","https://github.com/alexdantas/nsnake.debian",35.0934490741,0,2,0,0,1,0,0,1,1,"1",2,2 +"nsntrace",-0.2107095266,2.4855302503,-1.1430329763,"https://salsa.debian.org/sudip/nsntrace","https://github.com/nsntrace/nsntrace",1665.640150463,1,7,0,6,21,0,0,21,1,"1",1.875,2 +"nss-passwords",0.7982881531,3.7262660831,-0.2843886787,"https://salsa.debian.org/ocaml-team/nss-passwords","https://github.com/glondu/nss-passwords",4767.9518865741,1,2,0,2,4,0,0,5,3,"3",1.66666666666667,1.8 +"nulib2",-2.8835281311,-0.617225292,-3.3218622057,"https://salsa.debian.org/debian/nulib2","https://github.com/fadden/nulib2.git",2958.8671643519,0,7,0,4,9,0,0,9,2,"2",2,2 +"nuntius-linux",0.0562256061,3.0068525021,-0.7578958074,"https://salsa.debian.org/debian/nuntius-linux","https://github.com/holylobster/nuntius-linux.git",1285.1505324074,2,13,0,13,70,0,0,71,1,"1",1.86666666666667,1.98591549295775 +"nurpawiki",-4.202425836,-3.4681724303,-4.3504039812,"https://salsa.debian.org/ocaml-team/nurpawiki","https://github.com/glondu/nurpawiki.git",5643.4121296296,0,6,0,2,2,0,0,2,4,"4",2,2 +"nvidia-modprobe",0.5457409995,2.6334328552,-0.0334171669,"https://salsa.debian.org/nvidia-team/nvidia-modprobe","https://github.com/NVIDIA/nvidia-modprobe",3894.0040972222,0,3,0,3,7,0,0,9,3,"3",2,1.77777777777778 +"nvidia-persistenced",0.5544050718,2.8521283153,-0.0537008341,"https://salsa.debian.org/nvidia-team/nvidia-persistenced","https://github.com/NVIDIA/nvidia-persistenced",3871.0209606482,0,3,0,3,13,0,0,15,3,"3",2,1.86666666666667 +"nvidia-settings",0.3151479615,2.7684405123,-0.2288499596,"https://salsa.debian.org/nvidia-team/nvidia-settings","https://github.com/NVIDIA/nvidia-settings",5776.4649305556,24,5,0,16,143,0,0,150,4,"4",1.17241379310345,1.95333333333333 +"ocaml-ffmpeg",-1.7680324626,0.6213946308,-2.2379595426,"https://salsa.debian.org/ocaml-team/ocaml-ffmpeg","https://github.com/savonet/ocaml-ffmpeg.git",4033.3768634259,2,11,0,7,20,0,0,21,3,"3",1.84615384615385,1.95238095238095 +"ocaml-fileutils",-1.2078611318,0.0677154031,-1.4595756972,"https://salsa.debian.org/ocaml-team/ocaml-fileutils","https://github.com/gildor478/ocaml-fileutils.git",1144.3784027778,5,6,0,7,12,0,0,12,1,"1",1.54545454545455,2 +"ocaml-flac",-1.7507623662,-0.3502245327,-2.1890215844,"https://salsa.debian.org/ocaml-team/ocaml-flac","https://github.com/savonet/ocaml-flac.git",4915.2796990741,1,7,0,5,12,0,0,14,3,"3",1.875,1.85714285714286 +"gen",-2.9140964642,-0.9922910043,-3.3171869681,"https://salsa.debian.org/ocaml-team/ocaml-gen","https://github.com/c-cube/gen.git",3422.9857291667,3,9,0,7,18,0,0,18,2,"2",1.75,2 +"ocaml-gstreamer",-0.175799754,2.6087723309,-0.9430825776,"https://salsa.debian.org/ocaml-team/ocaml-gstreamer","https://github.com/savonet/ocaml-gstreamer.git",5244.7535532407,0,10,0,5,5,0,0,7,4,"4",2,1.71428571428571 +"ocaml-http",-1.5494605128,1.5864107076,-2.4465473259,"https://salsa.debian.org/ocaml-team/ocaml-http","https://github.com/sacerdot/ocaml-http.git",3570.2121180556,1,3,0,2,0,0,0,2,2,"2",1.75,1 +"ocaml-inotify",-1.5984447381,0.206726916,-1.9785130273,"https://salsa.debian.org/ocaml-team/ocaml-inotify","https://github.com/whitequark/ocaml-inotify",3586.2803240741,4,14,0,12,18,0,0,19,2,"2",1.77777777777778,1.94736842105263 +"ocaml-ladspa",-0.7118657078,1.2358767302,-1.4392313232,"https://salsa.debian.org/ocaml-team/ocaml-ladspa","https://github.com/savonet/ocaml-ladspa.git",4935.8736458333,1,7,0,4,4,0,0,6,3,"3",1.875,1.66666666666667 +"ocaml-ogg",-0.348620776,1.64371205,-0.9603602503,"https://salsa.debian.org/ocaml-team/ocaml-ogg","https://github.com/savonet/ocaml-ogg.git",5318.8518402778,1,7,0,4,2,0,0,4,4,"4",1.875,1.5 +"ocaml-opus",-0.9457632068,1.3513638625,-1.5381035109,"https://salsa.debian.org/ocaml-team/ocaml-opus","https://github.com/savonet/ocaml-opus.git",3889.1978819445,2,8,0,5,6,0,0,7,3,"3",1.8,1.85714285714286 +"res",-1.6619256072,0.8404387726,-2.374669465,"https://salsa.debian.org/ocaml-team/ocaml-res","https://github.com/mmottl/res",3234.9244791667,0,3,0,2,6,0,0,6,2,"2",2,2 +"ocaml-sha",-2.1615777656,-1.5624804098,-2.2474510973,"https://salsa.debian.org/ocaml-team/ocaml-sha","https://github.com/djs55/ocaml-sha.git",5351.1972453704,6,17,0,13,26,0,0,27,4,"4",1.73913043478261,1.96296296296296 +"ocaml-shine",-1.6537337701,1.6212733101,-2.5015175014,"https://salsa.debian.org/ocaml-team/ocaml-shine","https://github.com/savonet/ocaml-shine.git",3549.8277199074,1,5,0,4,3,0,0,5,2,"2",1.83333333333333,1.6 +"ocaml-speex",-0.6153846806,3.1543840863,-1.9637699192,"https://salsa.debian.org/ocaml-team/ocaml-speex","https://github.com/savonet/ocaml-speex.git",5316.9980902778,1,7,0,4,2,0,0,4,4,"4",1.875,1.5 +"ocaml-ssl",1.2627219166,4.0685720227,0.1401679649,"https://salsa.debian.org/ocaml-team/ocaml-ssl","https://github.com/savonet/ocaml-ssl.git",5405.4381828704,11,30,0,25,0,0,0,25,4,"4",1.73170731707317,1 +"ocaml-theora",-0.2512292534,3.1544360643,-1.4728171897,"https://salsa.debian.org/ocaml-team/ocaml-theora","https://github.com/savonet/ocaml-theora.git",5316.9970717593,1,8,0,4,1,0,0,4,4,"4",1.88888888888889,1.25 +"ocaml-usb",-0.5973686893,1.7793339383,-1.206091524,"https://salsa.debian.org/ocaml-team/ocaml-usb","https://github.com/letoh/ocaml-usb.git",4549.6073263889,1,8,0,5,8,0,0,10,3,"3",1.88888888888889,1.8 +"ocaml-vorbis",-0.9822001321,0.9986914273,-1.5520563192,"https://salsa.debian.org/ocaml-team/ocaml-vorbis","https://github.com/savonet/ocaml-vorbis.git",5459.5669675926,1,7,0,4,3,0,0,6,4,"4",1.875,1.5 +"ocamlagrep",-2.1652077496,-1.0121628969,-2.3572482465,"https://salsa.debian.org/ocaml-team/ocamlagrep","https://github.com/xavierleroy/ocamlagrep",2115.1310300926,1,2,0,2,4,0,0,4,1,"1",1.66666666666667,2 +"gsl-ocaml",0.1216448812,1.0155865797,-0.2462866522,"https://salsa.debian.org/ocaml-team/ocamlgsl","https://github.com/mmottl/gsl-ocaml.git",3442.6045023148,1,11,0,10,21,0,0,22,2,"2",1.91666666666667,1.95454545454545 +"ocaml-makefile",-0.4214445039,1.3411395826,-0.7864395598,"https://salsa.debian.org/ocaml-team/ocamlmakefile","https://github.com/mmottl/ocaml-makefile.git",1922.9826967593,0,4,0,2,8,0,0,8,1,"1",2,2 +"ocl-icd",0.2781454411,0.8515664588,0.03306071,"https://salsa.debian.org/opencl-team/ocl-icd","https://github.com/OCL-DEV/ocl-icd.git",4207.2761689815,2,15,0,5,27,0,0,28,3,"3",1.88235294117647,1.96428571428571 +"octave-mpi",-0.032052781,2.1492331512,-0.6364834294,"https://salsa.debian.org/pkg-octave-team/octave-mpi","https://github.com/carlodefalco/octave-mpi",1390.161724537,1,3,0,1,6,0,0,6,1,"1",1.75,2 +"odil",-0.8317789828,-0.397569442,-0.9351734244,"https://salsa.debian.org/med-team/odil","https://github.com/lamyj/odil",2678.1739351852,5,12,1,9,15,0,1,16,1,"1",1.70588235294118,1.9375 +"odt2txt",0.9552454239,3.2643599868,0.0923391006,"https://salsa.debian.org/debian/odt2txt","https://github.com/dstosberg/odt2txt",3417.1558564815,1,9,0,5,28,0,0,28,2,"2",1.9,2 +"ofxstatement",-0.8387724027,1.4898616569,-1.2924218148,"https://github.com/gerasiov/ofxstatement","https://github.com/gerasiov/ofxstatement",1632.6686689815,1,16,0,11,3,0,0,13,1,"1",1.94117647058824,1.23076923076923 +"ofxstatement-plugins",-0.5554916063,2.2730604682,-1.2542888677,"https://github.com/gerasiov/ofxstatement-plugins","https://github.com/gerasiov/ofxstatement-plugins",1689.0224305556,0,3,0,1,0,0,0,1,1,"1",2,1 +"ogdi",0.4637866222,1.3827381608,0.0703190227,"https://salsa.debian.org/debian-gis-team/ogdi-dfsg","https://github.com/libogdi/ogdi.git",5366.5318402778,1,9,0,9,11,0,0,13,4,"4",1.9,1.84615384615385 +"onesixtyone",-0.0525705364,1.7993576972,-0.4404876155,"https://salsa.debian.org/pkg-security-team/onesixtyone","https://github.com/trailofbits/onesixtyone",3350.0547222222,10,11,0,15,26,0,0,27,2,"2",1.52380952380952,1.96296296296296 +"onionbalance",-1.7072197089,-0.2953383489,-2.1044905747,"https://salsa.debian.org/debian/onionbalance","https://github.com/asn-d6/onionbalance.git",3123.2153240741,16,8,0,18,1,0,0,19,2,"2",1.33333333333333,1.05263157894737 +"Sensor",-0.705184402,0.5021820033,-0.967790767,"https://salsa.debian.org/multimedia-team/openni-sensor-primesense","https://github.com/PrimeSense/Sensor.git",1069.8803587963,0,3,0,3,28,0,1,31,1,"1",2,1.90322580645161 +"opensysusers",-3.3096631827,-1.1081118835,-3.751144934,"https://salsa.debian.org/debian/opensysusers","https://github.com/cromerc/opensysusers.git",1929.9289236111,4,11,0,5,2,0,0,5,1,"1",1.73333333333333,1.4 +"OpenMSX",0.5832066024,3.2825027954,-0.1430416611,"https://salsa.debian.org/openttd-team/openttd-openmsx","https://github.com/OpenTTD/OpenMSX.git",5037.8726041667,7,8,0,10,18,0,0,19,4,"4",1.53333333333333,1.94736842105263 +"OpenSFX",0.0341113683,1.8104216829,-0.3723043838,"https://salsa.debian.org/openttd-team/openttd-opensfx","https://github.com/OpenTTD/OpenSFX.git",5073.9709953704,7,9,0,10,14,0,0,15,4,"4",1.5625,1.93333333333333 +"opentyrian",-0.4709020515,1.8128682506,-0.9006361349,"https://salsa.debian.org/games-team/opentyrian","https://github.com/opentyrian/opentyrian.git",5445.2196527778,6,17,0,14,49,0,1,54,4,"4",1.73913043478261,1.90740740740741 +"platform",0.4510883183,2.2604153125,-0.0788317433,"https://salsa.debian.org/debian/p8-platform","https://github.com/Pulse-Eight/platform.git",2947.3549768519,2,28,0,23,43,0,0,48,2,"2",1.93333333333333,1.89583333333333 +"pacemaker",1.1235155799,1.8849677755,0.6240113585,"https://salsa.debian.org/ha-team/pacemaker","https://github.com/ClusterLabs/pacemaker",5780.1951388889,21,156,0,106,3,0,0,107,4,"4",1.88135593220339,1.02803738317757 +"packit",1.4894283431,3.9572075631,0.3794626915,"https://salsa.debian.org/debian/packit","https://github.com/resurrecting-open-source-projects/packit",2522.8474189815,3,11,0,6,11,0,0,11,1,"1",1.78571428571429,2 +"pacman4console.debian",0.7320531649,3.0292005631,-0.1602141611,"https://github.com/alexdantas/pacman4console.debian","https://github.com/alexdantas/pacman4console.debian",442.2178819444,0,2,0,2,1,0,0,3,1,"1",2,1.33333333333333 +"padthv1",-0.0637358518,2.799184112,-0.6752002578,"https://salsa.debian.org/multimedia-team/padthv1","https://github.com/rncbc/padthv1.git",2334.0719907407,2,4,0,3,6,0,0,6,1,"1",1.66666666666667,2 +"pajeng",-2.2918945291,-1.4246521723,-2.5749097918,"https://salsa.debian.org/debian/pajeng","https://github.com/schnorr/pajeng.git",3890.9853472222,1,24,0,10,19,0,5,24,3,"3",1.96,1.79166666666667 +"pam_p11",-0.5485831615,0.9644461867,-1.1064659619,"https://salsa.debian.org/opensc-team/pam-p11","https://github.com/OpenSC/pam_p11.git",5663.1348842593,3,10,0,11,24,0,0,25,4,"4",1.76923076923077,1.96 +"ParaFly",-0.7037850797,1.1831572633,-1.0930849211,"https://salsa.debian.org/med-team/parafly","https://github.com/ParaFly/ParaFly",1437.0966666667,1,4,0,2,1,0,0,3,1,"1",1.8,1.33333333333333 +"parallax",-0.0887932063,2.3891626891,-0.651790374,"https://salsa.debian.org/python-team/packages/parallax","https://github.com/krig/parallax",5166.3950231482,4,10,0,8,6,0,0,9,4,"4",1.71428571428571,1.66666666666667 +"partd",0.2096153056,2.6193211803,-0.3193732736,"https://salsa.debian.org/python-team/packages/partd","https://github.com/dask/partd.git",3130.7778009259,14,10,0,21,46,0,0,46,2,"2",1.41666666666667,2 +"pass-extension-tail",-0.3578050897,2.1366716684,-0.9333806276,"https://salsa.debian.org/debian/pass-extension-tail","https://github.com/palortoff/pass-extension-tail",1892.8072222222,4,2,0,5,18,0,0,18,1,"1",1.33333333333333,2 +"pastedeploy",0.1590091885,1.1475071601,-0.1727660592,"https://salsa.debian.org/python-team/packages/pastedeploy","https://github.com/Pylons/pastedeploy",4320.1172453704,5,24,0,21,22,0,0,33,3,"3",1.82758620689655,1.66666666666667 +"pastescript",0.3538232706,1.3551325439,-0.0943410822,"https://salsa.debian.org/python-team/packages/pastescript","https://github.com/cdent/pastescript.git",3347.9577893519,0,24,0,14,7,0,0,18,2,"2",2,1.38888888888889 +"libdir",-0.0254803142,1.5396086069,-0.4343390486,"https://salsa.debian.org/multimedia-team/pd/pd-libdir","https://github.com/pure-data/libdir",2709.9478356482,1,9,0,3,1,0,0,3,1,"1",1.9,1.33333333333333 +"pd-lua",-0.3693835135,1.759056146,-0.7808199336,"https://salsa.debian.org/multimedia-team/pd/pd-lua","https://github.com/agraef/pd-lua.git",3302.6912962963,1,8,0,6,12,0,0,12,2,"2",1.88888888888889,2 +"moonlib",-0.2205765237,2.0226305482,-0.7345172583,"https://salsa.debian.org/multimedia-team/pd/pd-moonlib","https://github.com/MetaluNet/moonlib.git",5328.8024537037,1,11,0,4,15,0,0,15,4,"4",1.91666666666667,2 +"PuRestJson",-0.254922487,2.320237042,-0.8198404593,"https://salsa.debian.org/multimedia-team/pd/pd-purest-json","https://github.com/residuum/PuRestJson.git",4472.3532291667,0,8,0,5,24,0,2,26,3,"3",2,1.92307692307692 +"tclpd",-0.5472322751,1.0653891207,-0.8320989326,"https://salsa.debian.org/multimedia-team/pd/pd-tclpd","https://github.com/pd-externals/tclpd.git",5367.8831018519,2,12,0,3,0,0,0,3,4,"4",1.85714285714286,1 +"vbap",-0.2128975248,1.7544581087,-0.7432504363,"https://salsa.debian.org/multimedia-team/pd/pd-vbap","https://github.com/pd-externals/vbap.git",5156.0736574074,1,7,0,2,5,0,0,5,4,"4",1.875,2 +"xsample",-0.3812603066,1.9525555214,-0.8681596425,"https://salsa.debian.org/multimedia-team/pd/pd-xsample","https://github.com/grrrr/xsample.git",5672.9809259259,1,13,0,6,6,0,0,9,4,"4",1.92857142857143,1.66666666666667 +"pdd",-0.9684689619,1.3033133236,-1.4106955016,"https://salsa.debian.org/debian/pdd","https://github.com/jarun/pdd.git",2233.8472337963,8,9,0,11,23,0,0,23,1,"1",1.52941176470588,2 +"pdfresurrect",-0.2399652539,1.6794626137,-0.5968823707,"https://salsa.debian.org/debian/pdfresurrect","https://github.com/enferex/pdfresurrect.git",5171.962662037,2,6,0,6,19,0,0,19,4,"4",1.75,2 +"pkg-pdudaemon",-2.9130668064,-0.1458508245,-3.6790610276,"https://github.com/pdudaemon/pkg-pdudaemon","https://github.com/pdudaemon/pkg-pdudaemon",1898.0415972222,9,22,0,16,6,0,0,19,1,"1",1.70967741935484,1.31578947368421 +"peony-extensions",-0.5641116061,1.8659191557,-1.1878043816,"https://github.com/ukui/peony-extensions","https://github.com/ukui/peony-extensions",1664.9383333333,13,33,0,17,25,0,0,31,1,"1",1.71739130434783,1.80645161290323 +"pgcharts",-0.3307169052,2.7252468866,-1.42193945,"https://github.com/dimitri/pgcharts","https://github.com/dimitri/pgcharts",2256.897962963,2,6,0,6,31,0,0,31,1,"1",1.75,2 +"pgextwlist",-2.6334021475,-0.1576929626,-3.2620922871,"https://github.com/dimitri/pgextwlist","https://github.com/dimitri/pgextwlist",4298.9919444445,2,19,0,12,42,0,0,42,3,"3",1.9047619047619,2 +"pgl_ddl_deploy",-2.518566076,0.3310770855,-3.2597707489,"https://salsa.debian.org/postgresql/pgl-ddl-deploy","https://github.com/enova/pgl_ddl_deploy.git",2403.2563425926,9,12,0,10,14,0,0,17,1,"1",1.57142857142857,1.82352941176471 +"pglogical_ticker",-1.9930028095,1.9160778986,-3.1056655448,"https://salsa.debian.org/postgresql/pglogical-ticker","https://github.com/enova/pglogical_ticker.git",1787.9691666667,1,7,0,5,4,0,0,5,1,"1",1.875,1.8 +"pgpdump",0.3614395033,1.5189339773,-0.144183693,"https://salsa.debian.org/debian/pgpdump","https://github.com/kazu-yamamoto/pgpdump.git",4538.9134143519,4,16,0,16,27,0,0,28,3,"3",1.8,1.96428571428571 +"pgqd",-1.087235167,1.0595056838,-1.531425517,"https://salsa.debian.org/postgresql/pgqd","https://github.com/pgq/pgqd",2225.1037384259,0,1,0,1,6,0,0,6,1,"1",2,2 +"pgsphere",-0.619432589,1.6193404032,-1.0673571695,"https://salsa.debian.org/postgresql/pgsphere","https://github.com/akorotkov/pgsphere",1961.9147569445,2,10,0,7,24,0,0,26,1,"1",1.83333333333333,1.92307692307692 +"pgsql-asn1oid",-2.1322683467,0.0065837251,-2.973862338,"https://github.com/df7cb/pgsql-asn1oid","https://github.com/df7cb/pgsql-asn1oid",2425.8964351852,3,4,0,5,4,0,0,5,1,"1",1.57142857142857,1.8 +"pgxnclient",-0.8515588813,0.3709704299,-1.1014910489,"https://salsa.debian.org/postgresql/pgxnclient","https://github.com/pgxn/pgxnclient.git",3780.2494212963,0,7,0,7,26,0,1,27,3,"3",2,1.96296296296296 +"pgzero",-0.0710203462,2.371473236,-0.5273222344,"https://github.com/RPi-Distro/pgzero","https://github.com/RPi-Distro/pgzero",1071.605775463,0,31,0,19,0,0,0,19,1,"1",2,1 +"Auth_SASL",0.4421914964,2.6769992169,-0.103972592,"https://salsa.debian.org/php-team/pear/php-auth-sasl","https://github.com/pear/Auth_SASL.git",5614.3564699074,3,10,0,7,4,0,0,8,4,"4",1.76923076923077,1.5 +"ansel",-1.6222799231,-0.0808757241,-1.9210437163,"https://salsa.debian.org/horde-team/php-horde-ansel","https://github.com/horde/ansel.git",3572.8158912037,8,17,0,12,3,0,0,13,2,"2",1.68,1.23076923076923 +"Auth",0.2047852084,2.9463639076,-0.5544067681,"https://salsa.debian.org/horde-team/php-horde-auth","https://github.com/horde/Auth.git",5222.153275463,8,22,0,12,3,0,0,13,4,"4",1.73333333333333,1.23076923076923 +"Cache",-0.1744700522,2.1064596197,-0.6213237314,"https://salsa.debian.org/horde-team/php-horde-cache","https://github.com/horde/Cache.git",5348.4683796296,2,18,0,8,2,0,0,9,4,"4",1.9,1.22222222222222 +"Compress",-0.0162442716,2.57315541,-0.6076939055,"https://salsa.debian.org/horde-team/php-horde-compress","https://github.com/horde/Compress.git",5217.754375,1,13,0,8,5,0,0,9,4,"4",1.92857142857143,1.55555555555556 +"Core",-0.3802607961,0.3526269848,-0.6046153747,"https://salsa.debian.org/horde-team/php-horde-core","https://github.com/horde/Core.git",5226.4980671296,21,34,0,20,9,0,0,25,4,"4",1.61818181818182,1.36 +"Crypt",0.1875117087,2.6751835929,-0.5329652206,"https://salsa.debian.org/horde-team/php-horde-crypt","https://github.com/horde/Crypt.git",5471.7365162037,3,21,0,13,6,0,0,16,4,"4",1.875,1.375 +"Css_Parser",-0.0402081222,2.5291557096,-0.6027329405,"https://salsa.debian.org/horde-team/php-horde-css-parser","https://github.com/horde/Css_Parser.git",3874.0563888889,2,10,0,6,4,0,0,7,3,"3",1.83333333333333,1.57142857142857 +"Data",0.183171821,3.0993813097,-0.5706552519,"https://salsa.debian.org/horde-team/php-horde-data","https://github.com/horde/Data.git",5055.5932638889,0,13,0,7,3,0,0,9,4,"4",2,1.33333333333333 +"Dav",-0.3866587637,0.750534239,-0.6284871625,"https://salsa.debian.org/horde-team/php-horde-dav","https://github.com/horde/Dav.git",3872.1194328704,2,9,0,7,2,0,0,8,3,"3",1.81818181818182,1.25 +"Db",-0.2646821748,1.3792981818,-0.615400448,"https://salsa.debian.org/horde-team/php-horde-db","https://github.com/horde/Db.git",5458.1645833333,6,19,0,14,13,0,0,23,4,"4",1.76,1.56521739130435 +"Editor",-0.2234265847,1.3429870434,-0.6059411864,"https://salsa.debian.org/horde-team/php-horde-editor","https://github.com/horde/Editor.git",5432.4430208333,0,10,0,4,0,0,0,4,4,"4",2,1 +"Form",0.1425278965,2.5646449602,-0.5503801228,"https://salsa.debian.org/horde-team/php-horde-form","https://github.com/horde/Form.git",5422.4999189815,3,17,0,11,2,0,0,13,4,"4",1.85,1.15384615384615 +"gollem",-0.1716189866,2.8981752591,-0.8667773936,"https://salsa.debian.org/horde-team/php-horde-gollem","https://github.com/horde/gollem.git",3924.770474537,2,13,0,7,0,0,0,7,3,"3",1.86666666666667,1 +"groupware",-0.8795755727,1.9558886765,-1.5950928322,"https://salsa.debian.org/horde-team/php-horde-groupware","https://github.com/horde/groupware.git",2932.5787731482,1,6,0,5,0,0,0,5,2,"2",1.85714285714286,1 +"Icalendar",0.411178925,3.9130953916,-0.5130418157,"https://salsa.debian.org/horde-team/php-horde-icalendar","https://github.com/horde/Icalendar.git",5159.3724305556,2,18,0,9,3,0,0,10,4,"4",1.9,1.3 +"Image",0.8616256223,3.8466113515,-0.1929764669,"https://salsa.debian.org/horde-team/php-horde-image","https://github.com/horde/Image.git",5265.7997569445,5,20,0,14,5,0,0,15,4,"4",1.8,1.33333333333333 +"Imap_Client",0.0159896159,2.4567285756,-0.5941860898,"https://salsa.debian.org/horde-team/php-horde-imap-client","https://github.com/horde/Imap_Client.git",5506.4812615741,14,23,0,22,21,0,0,34,4,"4",1.62162162162162,1.61764705882353 +"imp",-0.3872646541,1.289223631,-0.8571466277,"https://salsa.debian.org/horde-team/php-horde-imp","https://github.com/horde/imp.git",5305.9052546296,15,26,0,24,15,0,0,29,4,"4",1.63414634146341,1.51724137931034 +"ingo",-0.7382910403,0.4431034944,-0.9475741714,"https://salsa.debian.org/horde-team/php-horde-ingo","https://github.com/horde/ingo.git",4403.5670833333,10,21,0,17,4,0,0,19,3,"3",1.67741935483871,1.21052631578947 +"JavascriptMinify_Jsmin",-1.3153334642,2.2921605757,-2.4364015778,"https://salsa.debian.org/horde-team/php-horde-javascriptminify-jsmin","https://github.com/horde/JavascriptMinify_Jsmin.git",3603.5893634259,2,12,0,6,1,0,0,7,2,"2",1.85714285714286,1.14285714285714 +"kronolith",-0.1662532613,1.8723658314,-0.7951139086,"https://salsa.debian.org/horde-team/php-horde-kronolith","https://github.com/horde/kronolith.git",4413.8611458333,19,29,0,22,6,0,0,24,3,"3",1.60416666666667,1.25 +"ListHeaders",0.4960376568,4.1898452532,-0.5036453419,"https://salsa.debian.org/horde-team/php-horde-listheaders","https://github.com/horde/ListHeaders.git",4255.5799305556,2,10,0,6,1,0,0,7,3,"3",1.83333333333333,1.14285714285714 +"Mail",-0.3639164444,1.1332103907,-0.6269982172,"https://salsa.debian.org/horde-team/php-horde-mail","https://github.com/horde/Mail.git",4915.3072685185,7,13,0,11,9,0,0,17,3,"3",1.65,1.52941176470588 +"Mapi",-0.0661710252,2.5876798045,-0.6185327392,"https://salsa.debian.org/horde-team/php-horde-mapi","https://github.com/horde/Mapi.git",2259.7966087963,1,5,0,5,3,0,0,6,1,"1",1.83333333333333,1.5 +"Memcache",0.004016163,2.7221166702,-0.6028996022,"https://salsa.debian.org/horde-team/php-horde-memcache","https://github.com/horde/Memcache.git",4490.5543634259,3,7,0,6,1,0,0,7,3,"3",1.7,1.14285714285714 +"Mime",0.312598092,3.6199038108,-0.5392920252,"https://salsa.debian.org/horde-team/php-horde-mime","https://github.com/horde/Mime.git",5432.603287037,7,18,0,12,8,0,0,15,4,"4",1.72,1.53333333333333 +"Mime_Viewer",-0.1149494509,1.9424076317,-0.6016432814,"https://salsa.debian.org/horde-team/php-horde-mime-viewer","https://github.com/horde/Mime_Viewer.git",4839.7695138889,2,13,0,7,0,0,0,7,3,"3",1.86666666666667,1 +"mnemo",-0.6207827443,0.9747903027,-0.8920648669,"https://salsa.debian.org/horde-team/php-horde-mnemo","https://github.com/horde/mnemo.git",4989.4455671296,5,17,0,11,4,0,0,12,4,"4",1.77272727272727,1.33333333333333 +"Mongo",0.9167713268,5.4298937243,-0.4793837277,"https://salsa.debian.org/horde-team/php-horde-mongo","https://github.com/horde/Mongo.git",3839.6499652778,0,8,0,5,0,0,0,5,3,"3",2,1 +"Pack",0.2142725625,3.1945332925,-0.549560368,"https://salsa.debian.org/horde-team/php-horde-pack","https://github.com/horde/Pack.git",3648.4273842593,1,11,0,5,0,0,0,5,2,"2",1.91666666666667,1 +"passwd",-0.9612115226,1.4732179071,-1.6779013899,"https://salsa.debian.org/horde-team/php-horde-passwd","https://github.com/horde/passwd.git",4947.6389583333,4,19,0,12,5,0,0,13,3,"3",1.82608695652174,1.38461538461538 +"Role",-0.4479418321,1.1729020603,-0.7670302689,"https://salsa.debian.org/horde-team/php-horde-role","https://github.com/horde/Role.git",4810.1311111111,0,8,0,5,0,0,0,5,3,"3",2,1 +"sesha",-1.1621564014,1.5450444492,-1.9921994089,"https://salsa.debian.org/horde-team/php-horde-sesha","https://github.com/horde/sesha.git",2802.3719791667,3,8,0,7,1,0,0,8,2,"2",1.72727272727273,1.125 +"Test",-0.238823004,1.8788404924,-0.6415143522,"https://salsa.debian.org/horde-team/php-horde-test","https://github.com/horde/Test.git",5359.615,2,15,0,7,3,0,0,8,4,"4",1.88235294117647,1.375 +"Text_Filter",-0.1437145474,1.0768696744,-0.5555850141,"https://salsa.debian.org/horde-team/php-horde-text-filter","https://github.com/horde/Text_Filter.git",5251.3064930556,3,17,0,9,6,0,0,13,4,"4",1.85,1.46153846153846 +"Text_Filter_Jsmin",-1.3124045178,2.1222615389,-2.421955358,"https://salsa.debian.org/horde-team/php-horde-text-filter-jsmin","https://github.com/horde/Text_Filter_Jsmin.git",2314.7323726852,0,4,0,5,1,0,0,6,1,"1",2,1.16666666666667 +"trean",-0.3058682727,1.9780246873,-0.8789295788,"https://salsa.debian.org/horde-team/php-horde-trean","https://github.com/horde/trean.git",3562.8353472222,2,9,0,7,2,0,0,7,2,"2",1.81818181818182,1.28571428571429 +"turba",-0.4579650553,1.3117889624,-0.8859304773,"https://salsa.debian.org/horde-team/php-horde-turba","https://github.com/horde/turba.git",4857.3907407407,15,22,0,21,16,0,0,32,3,"3",1.59459459459459,1.5 +"webmail",-0.4053353634,1.7962363637,-1.0122255509,"https://salsa.debian.org/horde-team/php-horde-webmail","https://github.com/horde/webmail.git",2950.8800810185,2,6,0,6,2,0,0,6,2,"2",1.75,1.33333333333333 +"whups",-1.0654230845,1.9993317897,-1.8956270843,"https://salsa.debian.org/horde-team/php-horde-whups","https://github.com/horde/whups.git",3431.4867013889,4,18,0,11,0,0,0,11,2,"2",1.81818181818182,1 +"wicked",-1.0749433837,1.994516371,-1.8921752454,"https://salsa.debian.org/horde-team/php-horde-wicked","https://github.com/horde/wicked.git",4893.9981712963,5,14,0,9,5,0,0,11,3,"3",1.73684210526316,1.45454545454545 +"php-invoker",-0.2905127861,1.9595946138,-0.8899334149,"https://salsa.debian.org/php-team/pear/php-invoker","https://github.com/sebastianbergmann/php-invoker",4657.8966203704,2,7,0,5,14,0,0,14,3,"3",1.77777777777778,2 +"Mail_Mime",0.0757330813,0.6687496969,-0.1249911134,"https://salsa.debian.org/php-team/pear/php-mail-mime","https://github.com/pear/Mail_Mime.git",5740.767650463,4,21,0,21,26,0,0,35,4,"4",1.84,1.74285714285714 +"Net_LDAP2",0.6398853183,2.49018646,-0.0984745451,"https://salsa.debian.org/php-team/pear/php-net-ldap2","https://github.com/pear/Net_LDAP2.git",3594.4854166667,3,10,0,6,8,0,0,9,2,"2",1.76923076923077,1.88888888888889 +"Net_Sieve",0.5286086799,2.5513325545,-0.1071035548,"https://salsa.debian.org/php-team/pear/php-net-sieve","https://github.com/pear/Net_Sieve.git",4982.018912037,1,17,0,14,13,0,0,17,3,"3",1.94444444444444,1.76470588235294 +"Net_SMTP",0.6124793985,2.4835695922,0.0048970818,"https://salsa.debian.org/php-team/pear/php-net-smtp","https://github.com/pear/Net_SMTP.git",5742.5019097222,6,20,0,18,56,0,0,58,4,"4",1.76923076923077,1.96551724137931 +"Net_Socket",0.9079949967,3.0405813906,0.1178195629,"https://salsa.debian.org/php-team/pear/php-net-socket","https://github.com/pear/Net_Socket.git",3345.4632523148,1,15,0,13,12,0,0,15,2,"2",1.9375,1.8 +"manifest",0.0385459705,2.4455307258,-0.417874197,"https://salsa.debian.org/php-team/pear/php-phar-io-manifest","https://github.com/phar-io/manifest.git",2379.9058680556,3,9,0,9,17,0,0,18,1,"1",1.75,1.94444444444444 +"ReflectionCommon",0.0165590904,2.2866863971,-0.4124357108,"https://salsa.debian.org/php-team/pear/php-phpdocumentor-reflection-common","https://github.com/phpDocumentor/ReflectionCommon",2836.5084606482,10,9,0,12,17,0,0,17,2,"2",1.47368421052632,2 +"proxy-manager-lts",-0.4696575625,1.7442933083,-0.9000807342,"https://salsa.debian.org/php-team/pear/php-proxy-manager","https://github.com/FriendsOfPHP/proxy-manager-lts.git",3717.8990509259,21,47,0,55,26,0,0,78,2,"2",1.69117647058824,1.33333333333333 +"cache",0.9447656661,4.1692291038,-0.0612099304,"https://salsa.debian.org/php-team/pear/php-psr-cache","https://github.com/php-fig/cache.git",2530.1591435185,8,10,0,14,1,0,0,15,1,"1",1.55555555555556,1.06666666666667 +"http-message",-0.068042639,3.3445895377,-1.0312499156,"https://salsa.debian.org/php-team/pear/php-psr-http-message","https://github.com/php-fig/http-message",3219.4525347222,3,24,0,21,3,0,0,22,2,"2",1.88888888888889,1.13636363636364 +"Base",-0.0522904132,2.7525381131,-0.9743381106,"https://salsa.debian.org/php-team/pear/php-zeta-base","https://github.com/zetacomponents/Base.git",5395.1748726852,0,15,0,9,11,0,0,15,4,"4",2,1.73333333333333 +"ConsoleTools",-0.0924800072,2.7387441567,-0.9975723832,"https://salsa.debian.org/php-team/pear/php-zeta-console-tools","https://github.com/zetacomponents/ConsoleTools",5321.8501851852,2,14,0,12,14,0,0,17,4,"4",1.875,1.82352941176471 +"motranslator",0.3875308077,2.8677316161,-0.26542951,"https://salsa.debian.org/phpmyadmin-team/motranslator","https://github.com/phpmyadmin/motranslator",2762.9628356482,6,14,2,15,27,0,0,27,2,"2",1.7,2 +"global-state",0.247922925,2.3733235469,-0.3166378665,"https://salsa.debian.org/php-team/pear/phpunit-global-state","https://github.com/sebastianbergmann/global-state",3396.3039351852,9,7,0,12,28,0,0,28,2,"2",1.4375,2 +"object-enumerator",0.2543254206,2.979551806,-0.3372246914,"https://salsa.debian.org/php-team/pear/phpunit-object-enumerator","https://github.com/sebastianbergmann/object-enumerator",2872.2632523148,6,4,0,8,11,0,0,11,2,"2",1.4,2 +"pkg-pick",0.1551657364,3.388789847,-0.7551152625,"https://github.com/eavgerinos/pkg-pick","https://github.com/eavgerinos/pkg-pick",1591.7380671296,0,2,0,1,0,0,0,1,1,"1",2,1 +"pickleshare",0.3717500472,2.4243139962,-0.0927808249,"https://salsa.debian.org/python-team/packages/pickleshare","https://github.com/pickleshare/pickleshare",3583.9321875,1,14,0,11,33,0,0,33,2,"2",1.93333333333333,2 +"picocom",0.7162187737,2.5722054768,0.0257322882,"https://salsa.debian.org/debian/picocom","https://github.com/npat-efault/picocom",2876.49875,2,13,0,11,34,0,0,35,2,"2",1.86666666666667,1.97142857142857 +"plexus-interactivity",0.2831519667,2.3330540176,-0.1739153338,"https://salsa.debian.org/java-team/plexus-interactivity-api","https://github.com/codehaus-plexus/plexus-interactivity.git",2997.8996759259,5,11,0,10,10,0,0,12,2,"2",1.6875,1.83333333333333 +"plotnetcfg",-1.0220271784,1.3223739863,-1.4560802079,"https://salsa.debian.org/debian/plotnetcfg","https://github.com/jbenc/plotnetcfg.git",2530.945150463,2,3,0,3,11,0,0,13,1,"1",1.6,1.84615384615385 +"pmailq",-0.3444018612,2.2693637638,-1.1367799542,"https://salsa.debian.org/kolter/pmailq","https://github.com/k0lter/pmailq",3215.8993634259,0,2,0,1,0,0,0,1,2,"2",2,1 +"pmemkv",-2.5666563504,-0.1874336633,-3.0132308585,"https://github.com/kilobyte/pmemkv/tree/debian","https://github.com/kilobyte/pmemkv",2071.5010185185,11,29,0,21,1,0,0,22,1,"1",1.725,1.04545454545455 +"pnscan",0.0474645485,1.175913765,-0.3376962015,"https://salsa.debian.org/pkg-security-team/pnscan","https://github.com/ptrrkssn/pnscan",1864.9276967593,1,4,0,2,6,0,0,6,1,"1",1.8,2 +"podcastparser",0.1102473664,2.4024478231,-0.3412380946,"https://salsa.debian.org/debian/podcastparser","https://github.com/gpodder/podcastparser.git",3885.4088657408,6,16,0,18,26,0,0,26,3,"3",1.72727272727273,2 +"podget",0.0442858046,1.2592098163,-0.4584578402,"https://salsa.debian.org/debian/podget","https://github.com/dvehrs/podget.git",2945.994837963,1,10,0,8,35,0,1,38,2,"2",1.90909090909091,1.92105263157895 +"policyd-rate-limit",-1.5483891938,0.8603109839,-1.9855824959,"https://salsa.debian.org/python-team/packages/policyd-rate-limit","https://github.com/nitmir/policyd-rate-limit.git",2604.4654513889,1,4,0,4,24,0,0,24,1,"1",1.8,2 +"pps-tools",0.7472487963,4.4814305955,-0.4374778463,"https://github.com/bzed/pps-tools","https://github.com/bzed/pps-tools",3767.0434143519,3,10,0,5,2,0,0,7,2,"2",1.76923076923077,1.28571428571429 +"prads",0.259994197,3.8326314267,-1.0339454478,"https://salsa.debian.org/debian/prads","https://github.com/gamelinux/prads.git",4237.0082638889,2,39,0,11,30,0,2,33,3,"3",1.95121951219512,1.90909090909091 +"prefix",-1.1387443889,1.4705314302,-2.0097706447,"https://github.com/dimitri/prefix","https://github.com/dimitri/prefix",5681.2066782408,1,10,0,7,23,0,0,23,4,"4",1.90909090909091,2 +"preggy",-2.9228555263,-1.0464425405,-3.3186736503,"https://salsa.debian.org/python-team/packages/preggy","https://github.com/heynemann/preggy",3206.0471759259,1,12,2,8,14,0,0,16,2,"2",1.92307692307692,1.875 +"preprepare",-2.2210905897,-0.5977303937,-2.5998570115,"https://github.com/dimitri/preprepare","https://github.com/dimitri/preprepare",5242.6337615741,0,4,0,2,5,0,0,5,4,"4",2,2 +"primus_vk",-0.4212908417,2.921882742,-1.2334752443,"https://salsa.debian.org/nvidia-team/primus-vk","https://github.com/felixdoerre/primus_vk",1911.529537037,4,7,0,9,59,0,0,61,1,"1",1.63636363636364,1.9672131147541 +"princeprocessor",-1.2692837532,1.0737092479,-1.7210172993,"https://salsa.debian.org/pkg-security-team/princeprocessor","https://github.com/hashcat/princeprocessor.git",3216.9043981482,0,10,0,6,22,0,0,22,2,"2",2,2 +"proftpd-mod_case",-1.4646475873,0.7662724504,-2.0254092437,"https://salsa.debian.org/debian-proftpd-team/proftpd-mod-case","https://github.com/Castaglia/proftpd-mod_case.git",4180.9304050926,0,4,0,1,5,0,0,5,3,"3",2,2 +"mod_clamav",-0.5199500157,1.6804203805,-1.2969019371,"https://salsa.debian.org/debian-proftpd-team/proftpd-mod-clamav","https://github.com/jbenden/mod_clamav.git",3704.0200810185,2,4,0,5,16,0,0,17,2,"2",1.66666666666667,1.94117647058824 +"proftpd-mod_counter",-3.9091957799,-1.6311020735,-4.3444753088,"https://salsa.debian.org/debian-proftpd-team/proftpd-mod-counter","https://github.com/Castaglia/proftpd-mod_counter",4182.156412037,0,3,0,1,3,0,0,3,3,"3",2,2 +"proftpd-mod_msg",-1.7610775956,0.1821621492,-2.2899965266,"https://salsa.debian.org/debian-proftpd-team/proftpd-mod-msg","https://github.com/Castaglia/proftpd-mod_msg",1530.1719212963,0,2,0,1,1,0,0,1,1,"1",2,2 +"proftpd-mod_tar",-1.0180464333,1.4128864786,-1.7353120048,"https://salsa.debian.org/debian-proftpd-team/proftpd-mod-tar","https://github.com/Castaglia/proftpd-mod_tar.git",4180.9053935185,0,2,0,1,3,0,0,3,3,"3",2,2 +"proftpd-mod_vroot",1.5988542337,4.0231527893,0.5685130663,"https://salsa.debian.org/debian-proftpd-team/proftpd-mod-vroot","https://github.com/Castaglia/proftpd-mod_vroot.git",3875.2868518519,0,5,0,3,23,0,0,23,3,"3",2,2 +"bind_exporter",-1.219120384,0.70031567,-1.6696173791,"https://salsa.debian.org/go-team/packages/prometheus-bind-exporter","https://github.com/prometheus-community/bind_exporter",2946.8200115741,21,14,0,25,30,0,1,51,2,"2",1.4,1.58823529411765 +"mailexporter",-1.4619262945,0.8353265582,-1.9708877275,"https://salsa.debian.org/go-team/packages/prometheus-mailexporter","https://github.com/cherti/mailexporter",2367.3820486111,4,4,1,6,16,0,0,16,1,"1",1.5,2 +"pspg",-0.3610506999,2.0130078842,-0.820706513,"https://salsa.debian.org/postgresql/pspg","https://github.com/okbob/pspg",2316.4040509259,13,25,0,29,14,0,0,39,1,"1",1.65789473684211,1.35897435897436 +"Psychtoolbox-3",0.2033527556,1.6529232576,-0.3714926285,"https://github.com/neurodebian/Psychtoolbox-3/tree/debian","https://github.com/neurodebian/Psychtoolbox-3",5782.8479166667,14,56,0,38,2,0,0,39,4,"4",1.8,1.05128205128205 +"pt2-clone",-0.3668249418,2.0442471334,-0.8709375553,"https://salsa.debian.org/multimedia-team/pt2-clone","https://github.com/8bitbubsy/pt2-clone",1458.0896180556,2,4,0,4,7,0,0,10,1,"1",1.66666666666667,1.7 +"PTable",-0.4977567219,1.9029777422,-1.0355607788,"https://salsa.debian.org/python-team/packages/ptable","https://github.com/kxxoling/PTable",3352.2971990741,2,16,0,9,45,0,0,45,2,"2",1.88888888888889,2 +"printer-driver-ptouch",2.9461393952,6.8234280435,1.5185561181,"https://salsa.debian.org/printing-team/ptouch-driver","https://github.com/philpem/printer-driver-ptouch.git",1342.5621990741,5,13,0,9,42,0,1,45,1,"1",1.72222222222222,1.93333333333333 +"puppetlabs-mysql",-1.0852269476,0.911414697,-1.5945594785,"https://salsa.debian.org/puppet-team/puppet-module-puppetlabs-mysql","https://github.com/puppetlabs/puppetlabs-mysql",4577.2790046296,89,362,0,277,0,0,0,277,3,"3",1.80266075388027,1 +"puppetlabs-xinetd",-1.728520912,0.7618236366,-2.2296657543,"https://salsa.debian.org/puppet-team/puppet-module-puppetlabs-xinetd","https://github.com/puppetlabs/puppetlabs-xinetd",4771.0705671296,11,67,0,44,13,0,0,53,3,"3",1.85897435897436,1.24528301886792 +"purl",-1.3403902917,0.9095061718,-1.8075410282,"https://salsa.debian.org/python-team/packages/purl","https://github.com/codeinthehole/purl",3937.9855092593,4,18,0,13,36,0,0,36,3,"3",1.81818181818182,2 +"pwgen",1.3539562516,2.2914753933,0.7855817259,"https://github.com/tytso/pwgen","https://github.com/tytso/pwgen",1771.0365509259,6,3,0,5,16,0,0,18,1,"1",1.33333333333333,1.88888888888889 +"project--perl-webget",-0.4530628758,1.9572713675,-1.0628915119,"https://salsa.debian.org/debian/pwget","https://github.com/jaalto/project--perl-webget",3883.3964236111,0,1,0,1,0,0,0,1,3,"3",2,1 +"pydl",-0.4956083654,0.3240229847,-0.642218824,"https://salsa.debian.org/debian-astro-team/pydl","https://github.com/weaverba137/pydl",4774.0527777778,1,11,1,10,23,0,0,26,3,"3",1.91666666666667,1.88461538461538 +"pyepr",-0.9391839973,0.1389487685,-1.21878767,"https://salsa.debian.org/debian-gis-team/pyepr","https://github.com/avalentino/pyepr.git",4620.4665856482,0,3,0,1,7,0,0,7,3,"3",2,2 +"pyfribidi",-1.3111437363,-0.4469862862,-1.5898484292,"https://salsa.debian.org/python-team/packages/pyfribidi","https://github.com/pediapress/pyfribidi.git",2842.4984953704,1,5,0,3,14,0,0,14,2,"2",1.83333333333333,2 +"PyGnuplot",-0.3092811424,1.9971008368,-0.816765548,"https://salsa.debian.org/python-team/packages/pygnuplot","https://github.com/benschneider/PyGnuplot",2586.3193055556,0,7,0,3,14,0,0,14,1,"1",2,2 +"PyGreSQL",0.6546350335,1.713004741,0.0882104427,"https://salsa.debian.org/debian/pygresql","https://github.com/PyGreSQL/PyGreSQL",5390.1054513889,4,4,4,8,32,0,0,36,4,"4",1.5,1.88888888888889 +"pygtail",-0.539020119,3.1329292561,-1.6179088283,"https://salsa.debian.org/python-team/packages/pygtail","https://github.com/bgreenlee/pygtail",4147.3947800926,7,19,0,17,74,0,0,75,3,"3",1.73076923076923,1.98666666666667 +"pygtkspellcheck",0.7257355054,2.6166114148,0.0292934832,"https://salsa.debian.org/python-team/packages/pygtkspellcheck","https://github.com/koehlma/pygtkspellcheck",4478.3301851852,2,11,1,6,23,0,0,23,3,"3",1.84615384615385,2 +"python-pass",-0.8847004821,1.9218976351,-1.6206835515,"https://salsa.debian.org/python-team/packages/pypass","https://github.com/ReAzem/python-pass.git",1834.5500810185,3,11,0,9,16,0,1,17,1,"1",1.78571428571429,1.94117647058824 +"pypdf",0.3363136294,1.8784846763,-0.1155181855,"https://salsa.debian.org/debian/pypdf","https://github.com/py-pdf/pypdf",4367.5921759259,137,91,3,200,0,0,0,200,3,"3",1.39912280701754,1 +"python-pypeg2-debian",0.0855915399,2.2545524529,-0.3458051782,"https://github.com/fiete201/python-pypeg2-debian","https://github.com/fiete201/python-pypeg2-debian",825.4394097222,0,2,0,1,1,0,0,2,1,"1",2,1.5 +"Pyphen",-0.5188951039,1.8020010624,-0.9777786823,"https://salsa.debian.org/python-team/packages/pyphen","https://github.com/Kozea/Pyphen",3769.9223263889,0,13,0,5,56,0,0,57,3,"3",2,1.98245614035088 +"pyqso",-0.3070953036,2.5075014452,-0.9777672312,"https://salsa.debian.org/debian-hamradio-team/pyqso","https://github.com/ctjacobs/pyqso",2213.7885648148,2,9,5,5,25,0,0,25,1,"1",1.81818181818182,2 +"PyQwt3D",-0.3970590115,0.7440597483,-0.9451413135,"https://salsa.debian.org/python-team/packages/pyqwt3d","https://github.com/GauiStori/PyQwt3D",1540.4164930556,0,3,0,1,1,0,0,2,1,"1",2,1.5 +"pyRFC3339",0.2375193564,1.6166813486,-0.0819212234,"https://salsa.debian.org/python-team/packages/pyrfc3339","https://github.com/kurtraschke/pyRFC3339",3552.2014583333,1,7,0,7,14,0,0,14,2,"2",1.875,2 +"pysmi",0.2393270185,2.2118303467,-0.1841478946,"https://salsa.debian.org/python-team/packages/pysmi","https://github.com/etingof/pysmi",1806.3306018519,5,7,0,9,59,0,0,60,1,"1",1.58333333333333,1.98333333333333 +"pytest-runner",0.4615736429,3.294817871,-0.4721455985,"https://salsa.debian.org/python-team/packages/pytest-runner","https://github.com/pytest-dev/pytest-runner.git",4387.1189699074,16,10,0,24,56,0,0,67,3,"3",1.38461538461538,1.83582089552239 +"pytest-tornado",-1.6610342646,0.2346703329,-2.0594120368,"https://salsa.debian.org/python-team/packages/pytest-tornado","https://github.com/eugeniy/pytest-tornado",2043.2375578704,2,15,0,12,44,0,0,44,1,"1",1.88235294117647,2 +"activipy",-2.4231132595,-0.8156429792,-2.7787913771,"https://salsa.debian.org/python-team/packages/python-activipy","https://github.com/w3c-social/activipy",294.9819907407,0,1,0,1,9,0,0,9,1,"1",2,2 +"python-admesh",-0.1275889532,1.1910011407,-0.48238652,"https://salsa.debian.org/science-team/python-admesh","https://github.com/admesh/python-admesh",1607.8702662037,1,1,0,2,9,0,0,9,1,"1",1.5,2 +"alignlib",-4.6393972307,-1.9112598753,-5.3987487651,"https://salsa.debian.org/med-team/python-alignlib","https://github.com/marcelm/alignlib.git",1738.8239930556,1,3,0,2,2,0,0,2,1,"1",1.75,2 +"altgraph",-0.1776641612,2.0796554317,-0.6175630942,"https://salsa.debian.org/python-team/packages/python-altgraph","https://github.com/ronaldoussoren/altgraph",5013.4008912037,1,6,0,4,5,0,0,7,4,"4",1.85714285714286,1.71428571428571 +"arpy",-0.7545902864,2.54869808,-1.7298420281,"https://salsa.debian.org/python-team/packages/python-arpy","https://github.com/viraptor/arpy.git",4328.1231134259,1,9,0,8,14,0,0,17,3,"3",1.9,1.82352941176471 +"asttokens",0.3340810363,3.0114183655,-0.2887013264,"https://salsa.debian.org/python-team/packages/python-asttokens","https://github.com/gristlabs/asttokens.git",2518.9855439815,9,8,0,14,30,0,0,33,1,"1",1.47058823529412,1.90909090909091 +"python-caja",0.0214160855,0.7395995669,-0.2085070184,"https://salsa.debian.org/debian-mate-team/python-caja","https://github.com/mate-desktop/python-caja.git",4326.7211342593,10,21,0,18,39,0,0,45,3,"3",1.67741935483871,1.86666666666667 +"python-driver",-0.8062754247,1.604168392,-1.7480948985,"https://salsa.debian.org/python-team/packages/python-cassandra-driver","https://github.com/datastax/python-driver.git",3941.7978935185,43,186,0,129,3,0,0,130,3,"3",1.81222707423581,1.02307692307692 +"changelog",-1.7044805447,-0.290367733,-2.0502430594,"https://salsa.debian.org/python-team/packages/python-changelog","https://github.com/sqlalchemyorg/changelog",3951.4740509259,6,7,0,5,7,0,0,8,3,"3",1.53846153846154,1.875 +"cheroot",0.2184766626,2.5790389703,-0.2566344453,"https://salsa.debian.org/python-team/packages/python-cheroot","https://github.com/cherrypy/cheroot.git",5771.2991898148,32,151,0,116,6,0,0,117,4,"4",1.82513661202186,1.05128205128205 +"click-plugins",0.1835966503,2.5094374551,-0.2993391913,"https://salsa.debian.org/debian-gis-team/python-click-plugins/","https://github.com/click-contrib/click-plugins.git",1359.2907638889,1,8,0,5,25,0,0,25,1,"1",1.88888888888889,2 +"cligj",0.0110381728,2.5995508465,-0.499940708,"https://salsa.debian.org/debian-gis-team/python-cligj","https://github.com/mapbox/cligj.git",2777.8914699074,2,10,0,5,17,0,0,18,2,"2",1.83333333333333,1.94444444444444 +"python-debianbts",0.5135384712,1.0251605893,0.2314442315,"https://github.com/venthur/python-debianbts","https://github.com/venthur/python-debianbts",5257.8413310185,2,16,0,12,20,0,0,22,4,"4",1.88888888888889,1.90909090909091 +"deeptools_intervals",-2.8771627651,-0.6096159473,-3.3226496791,"https://salsa.debian.org/med-team/python-deeptoolsintervals","https://github.com/deeptools/deeptools_intervals",1246.0450694445,0,4,0,1,4,0,0,4,1,"1",2,2 +"demjson",-0.2370389615,1.8179175852,-0.8013751143,"https://salsa.debian.org/python-team/packages/python-demjson","https://github.com/dmeranda/demjson",1291.8414699074,0,1,0,1,3,0,2,5,1,"1",2,1.6 +"deprecated",0.1196653299,2.2597788252,-0.3084855603,"https://salsa.debian.org/debian-gis-team/python-deprecated","https://github.com/tantale/deprecated.git",2057.2850694445,18,4,0,17,55,0,0,55,1,"1",1.18181818181818,2 +"diaspy",-2.1745867988,0.053506734,-2.6165608868,"https://salsa.debian.org/python-team/packages/python-diaspy","https://github.com/marekjm/diaspy",3779.1691319445,4,18,0,10,31,0,0,31,3,"3",1.81818181818182,2 +"diff-match-patch",0.5846033815,3.0986556298,-0.1184020196,"https://salsa.debian.org/debian/python-diff-match-patch","https://github.com/diff-match-patch-python/diff-match-patch",1729.8804282407,3,2,0,3,3,0,0,5,1,"1",1.4,1.6 +"django-contact-form",-1.1097333705,0.6281218172,-1.6435972974,"https://salsa.debian.org/python-team/packages/python-django-contact-form","https://github.com/ubernostrum/django-contact-form",5539.2370717593,2,14,0,13,45,0,0,45,4,"4",1.875,2 +"django-etcd-settings",-0.9896632674,2.2575790822,-1.9919766953,"https://salsa.debian.org/python-team/packages/python-django-etcd-settings","https://github.com/kpn-digital/django-etcd-settings",2402.9784375,6,17,0,10,16,0,0,17,1,"1",1.73913043478261,1.94117647058824 +"django-gravatar",-0.663578474,1.1679046767,-1.1279388031,"https://salsa.debian.org/python-team/packages/python-django-gravatar2","https://github.com/twaddington/django-gravatar",3121.6933101852,1,16,0,12,30,0,0,30,2,"2",1.94117647058824,2 +"django-jsonfield",-1.0714207355,-0.0546197296,-1.3093579612,"https://salsa.debian.org/python-team/modules/python-django-jsonfield","https://github.com/adamchainz/django-jsonfield",3841.3997222222,3,25,0,23,14,0,0,33,3,"3",1.89285714285714,1.42424242424242 +"django-libsass",-4.8173196894,-2.3911675188,-5.4384155483,"https://salsa.debian.org/python-team/packages/python-django-libsass","https://github.com/torchbox/django-libsass.git",3571.0059490741,10,9,0,14,47,0,1,52,2,"2",1.47368421052632,1.90384615384615 +"python-ecdsa",0.1427395231,1.7301290558,-0.1550589722,"https://salsa.debian.org/python-team/packages/python-ecdsa","https://github.com/warner/python-ecdsa.git",4921.8631134259,21,34,0,44,13,0,0,51,3,"3",1.61818181818182,1.25490196078431 +"python-epc",-0.6679338747,1.8418923245,-1.2097561588,"https://salsa.debian.org/python-team/packages/python-epc","https://github.com/tkf/python-epc",2413.0286574074,1,4,0,3,7,0,0,7,1,"1",1.8,2 +"esmre",-2.0064156677,0.202087282,-2.4755780824,"https://salsa.debian.org/debian/python-esmre","https://github.com/wharris/esmre.git",5681.6213078704,0,3,0,1,15,0,0,15,4,"4",2,2 +"python-ethtool",0.2749622306,1.8273292709,-0.3035215573,"https://salsa.debian.org/python-team/packages/python-ethtool","https://github.com/fedora-python/python-ethtool/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA +"python-fastimport",0.1052775184,1.7457116755,-0.2624270625,"https://salsa.debian.org/python-team/packages/python-fastimport","https://github.com/jelmer/python-fastimport",5680.5950578704,13,39,0,27,14,0,0,34,4,"4",1.75,1.41176470588235 +"fisx",-0.0903144328,1.779732029,-0.5983249377,"https://salsa.debian.org/python-team/packages/python-fisx","https://github.com/vasole/fisx",3592.9752777778,0,12,0,5,12,0,1,13,2,"2",2,1.92307692307692 +"fluids",-0.4421216281,2.7506775199,-1.3660582858,"https://salsa.debian.org/science-team/python-fluids","https://github.com/CalebBell/fluids/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA +"python-frozendict",0.1906884697,2.6355499741,-0.3237980302,"https://salsa.debian.org/openstack-team/python/python-frozendict","https://github.com/slezica/python-frozendict.git",1398.6479861111,1,9,0,6,48,0,0,48,1,"1",1.9,2 +"hiredis-py",-0.3124185118,1.2752110833,-0.6377697773,"https://salsa.debian.org/python-team/packages/python-hiredis","https://github.com/redis/hiredis-py.git",4704.1113541667,26,23,0,38,10,0,0,46,3,"3",1.46938775510204,1.21739130434783 +"python-hl7",-0.7626378243,0.9988106393,-1.372928154,"https://salsa.debian.org/med-team/python-hl7","https://github.com/johnpaulett/python-hl7.git",5098.8429398148,5,6,0,7,54,0,0,54,4,"4",1.54545454545455,2 +"hupper",-0.4811484079,1.3299311475,-0.8419038999,"https://salsa.debian.org/python-team/packages/python-hupper","https://github.com/Pylons/hupper",2605.9951273148,4,15,0,12,35,0,0,38,1,"1",1.78947368421053,1.92105263157895 +"imagesize_py",0.7812671799,3.7438976125,-0.0426186257,"https://salsa.debian.org/python-team/packages/python-imagesize","https://github.com/shibukawa/imagesize_py",2343.1267013889,9,9,0,15,45,0,0,45,1,"1",1.5,2 +"python-Levenshtein",0.4783401273,1.9718349997,-0.0580315974,"https://salsa.debian.org/python-team/packages/python-levenshtein","https://github.com/maxbachmann/python-Levenshtein",378.9515509259,1,2,0,1,9,0,0,9,1,"1",1.66666666666667,2 +"python-libdiscid",0.0391061082,1.6124132852,-0.2458440286,"https://salsa.debian.org/multimedia-team/python-libdiscid","https://github.com/sebastinas/python-libdiscid.git",3900.1796643519,3,5,0,6,8,0,0,8,3,"3",1.625,2 +"python-librtmp-debian",0.1316033854,2.9370114855,-0.6388179337,"https://github.com/breunigs/python-librtmp-debian","https://github.com/breunigs/python-librtmp-debian",409.9315625,0,1,0,1,0,0,0,1,1,"1",2,1 +"python-louvain",-2.2685779365,1.4962495682,-3.4339761137,"https://salsa.debian.org/python-team/packages/python-louvain","https://github.com/taynaud/python-louvain/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA +"lti",-1.9083591935,0.6995479122,-2.570199413,"https://salsa.debian.org/python-team/packages/python-lti","https://github.com/pylti/lti.git",2862.783125,11,19,0,21,32,0,0,42,2,"2",1.63333333333333,1.76190476190476 +"macholib",-0.2065761669,2.1953061241,-0.6422011034,"https://salsa.debian.org/python-team/packages/python-macholib","https://github.com/ronaldoussoren/macholib",5321.569525463,1,18,0,12,8,0,0,17,4,"4",1.94736842105263,1.47058823529412 +"py-magcode-core",-0.7794988336,2.2254089124,-1.7093223217,"https://github.com/grantma/py-magcode-core","https://github.com/grantma/py-magcode-core",2649.7967939815,0,2,0,1,0,0,0,1,1,"1",2,1 +"markdown",-0.0672775301,0.0633658209,-0.1115484973,"https://salsa.debian.org/python-team/packages/python-markdown","https://github.com/Python-Markdown/markdown",5779.5951967593,101,82,0,147,24,0,96,260,4,"4",1.44808743169399,1.09230769230769 +"multipletau",-0.6987933509,0.5806821661,-0.9526942305,"https://salsa.debian.org/python-team/packages/python-multipletau","https://github.com/FCS-analysis/multipletau",3692.0178935185,2,10,0,4,7,0,0,7,2,"2",1.83333333333333,2 +"murmurhash",-0.581276748,1.7599072349,-1.1918965779,"https://salsa.debian.org/python-team/packages/python-murmurhash","https://github.com/explosion/murmurhash",3382.167962963,3,8,0,7,24,0,0,25,2,"2",1.72727272727273,1.96 +"netaddr",0.0168867873,0.3272246191,-0.1009353472,"https://salsa.debian.org/python-team/packages/python-netaddr","https://github.com/netaddr/netaddr/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA +"python-netfilter",-1.0831097652,1.3819658705,-1.6354879803,"https://salsa.debian.org/python-team/modules/python-netfilter","https://github.com/jlaine/python-netfilter.git",1238.4928935185,0,1,0,1,5,0,0,5,1,"1",2,2 +"python-netsyslog",-3.0699282944,-0.7408374792,-3.6931507709,"https://github.com/dpocock/python-netsyslog","https://github.com/dpocock/python-netsyslog",1856.5705092593,0,2,0,2,0,0,0,2,1,"1",2,1 +"nine",-0.8784732907,1.5749400058,-1.435685821,"https://salsa.debian.org/python-team/packages/python-nine","https://github.com/nandoflorestan/nine",2401.4576273148,0,3,0,2,5,0,0,5,1,"1",2,2 +"noise",-3.7225843383,-1.0965675709,-4.3183675373,"https://salsa.debian.org/python-team/packages/python-noise","https://github.com/caseman/noise.git",2101.5036111111,1,8,0,6,49,0,0,49,1,"1",1.88888888888889,2 +"nose-random",-2.0063531384,0.3270712054,-2.4723359773,"https://salsa.debian.org/science-team/python-nose-random","https://github.com/fzumstein/nose-random",352.6133101852,0,1,0,1,3,0,0,4,1,"1",2,1.75 +"numpysane",-0.4267537204,1.9973501717,-0.9903343511,"https://salsa.debian.org/python-team/packages/python-numpysane","https://github.com/dkogan/numpysane",2696.1738194445,0,2,0,1,3,0,0,3,1,"1",2,2 +"padme",-0.8073688582,2.1816485148,-1.677229387,"https://salsa.debian.org/python-team/packages/python-padme","https://github.com/zyga/padme",2875.0020023148,1,3,1,1,3,0,0,3,2,"2",1.75,2 +"pkgconfig",0.1589137832,2.4301443545,-0.3239570925,"https://salsa.debian.org/python-team/packages/python-pkgconfig","https://github.com/matze/pkgconfig",2902.384537037,4,12,0,14,42,0,0,42,2,"2",1.75,2 +"plaster",-0.2804648853,2.1267152731,-0.8306048313,"https://salsa.debian.org/python-team/packages/python-plaster","https://github.com/pylons/plaster",2744.1181365741,7,5,0,7,13,0,0,13,1,"1",1.41666666666667,2 +"plaster_pastedeploy",-0.2975329299,2.1673923637,-0.8381262743,"https://salsa.debian.org/python-team/packages/python-plaster-pastedeploy","https://github.com/Pylons/plaster_pastedeploy.git",2741.5056365741,4,5,0,7,13,0,0,14,1,"1",1.55555555555556,1.92857142857143 +"pluginbase",-0.2812881057,2.0590234382,-0.7551622974,"https://salsa.debian.org/python-team/packages/python-pluginbase","https://github.com/mitsuhiko/pluginbase.git",2511.8068518519,1,9,0,7,38,0,1,40,1,"1",1.9,1.95 +"python-popcon",-0.2335331727,2.0183447681,-1.1098924395,"https://github.com/venthur/python-popcon","https://github.com/venthur/python-popcon",4753.6013657408,3,5,0,5,7,0,0,9,3,"3",1.625,1.77777777777778 +"python-poppler-qt5",0.1202276082,2.3680686792,-0.3076713871,"https://salsa.debian.org/python-team/packages/python-poppler-qt5","https://github.com/frescobaldi/python-poppler-qt5",3161.7950231482,7,7,1,11,89,0,1,90,2,"2",1.5,1.98888888888889 +"python_portpicker",-0.8378084904,1.8598481156,-1.5521700439,"https://salsa.debian.org/debian/python-portpicker","https://github.com/google/python_portpicker",3069.1269212963,11,7,0,10,15,0,0,15,2,"2",1.38888888888889,2 +"pure-python-otr",-0.0437206443,2.0655225856,-0.6499675642,"https://salsa.debian.org/python-team/packages/python-potr","https://github.com/python-otr/pure-python-otr",3956.9618634259,0,15,3,8,52,0,2,54,3,"3",2,1.96296296296296 +"pretend",-0.7061164562,2.3197823691,-1.5465608612,"https://salsa.debian.org/python-team/packages/python-pretend","https://github.com/alex/pretend",3941.0314351852,2,9,0,9,19,0,0,19,3,"3",1.81818181818182,2 +"python-progressbar",0.3759281126,2.2892745816,-0.1083290674,"https://salsa.debian.org/python-team/packages/python-progressbar","https://github.com/niltonvolpato/python-progressbar",3503.7755555556,3,12,0,8,61,0,0,63,2,"2",1.8,1.96825396825397 +"python-protobix",-3.1476883564,-0.7372721621,-3.7253868496,"https://salsa.debian.org/python-team/packages/python-protobix","https://github.com/jbfavre/python-protobix",3133.4746064815,0,14,1,0,16,0,0,16,2,"2",2,2 +"pulp",0.1825004112,2.2768415582,-0.3249522323,"https://salsa.debian.org/math-team/python-pulp","https://github.com/coin-or/pulp/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA +"Pweave",0.1974177671,3.6215699256,-0.8175147018,"https://salsa.debian.org/science-team/python-pweave","https://github.com/mpastell/Pweave/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA +"pybadges",-3.4188935767,0.0271868396,-4.2767006556,"https://salsa.debian.org/python-team/packages/python-pybadges","https://github.com/google/pybadges.git",1932.0270833333,2,14,0,12,29,0,0,29,1,"1",1.875,2 +"pyqrencode",0.0034268604,1.6950809833,-0.4794074089,"https://salsa.debian.org/debian/python-qrencode","https://github.com/Arachnid/pyqrencode.git",3791.5353703704,0,6,0,5,22,0,0,22,3,"3",2,2 +"ratelimiter",-0.1714954577,2.6072632937,-0.9266913485,"https://salsa.debian.org/python-team/packages/python-ratelimiter","https://github.com/RazerM/ratelimiter",1781.4938425926,1,5,0,3,29,0,0,30,1,"1",1.83333333333333,1.96666666666667 +"rebulk",-0.1999574426,2.0907811548,-0.82792677,"https://salsa.debian.org/python-team/packages/python-rebulk","https://github.com/Toilal/rebulk",3019.4120833333,1,7,2,4,15,0,0,16,2,"2",1.875,1.9375 +"rencode",0.3723707617,3.0060692556,-0.2039050857,"https://salsa.debian.org/debian/python-rencode","https://github.com/aresch/rencode.git",4103.1734490741,4,4,0,5,18,0,0,18,3,"3",1.5,2 +"repoze.sphinx.autointerface",-1.3367767902,1.5129207319,-2.1830695792,"https://salsa.debian.org/python-team/packages/python-repoze.sphinx.autointerface","https://github.com/repoze/repoze.sphinx.autointerface/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA +"repoze.tm2",-0.795011466,1.8758832556,-1.600218467,"https://salsa.debian.org/python-team/packages/python-repoze.tm2","https://github.com/repoze/repoze.tm2.git",5299.0136921296,0,6,0,3,8,0,0,8,4,"4",2,2 +"roman",0.4266969046,1.9457667884,-0.0044298123,"https://salsa.debian.org/python-team/packages/python-roman","https://github.com/zopefoundation/roman",5054.6666666667,3,8,0,8,15,0,0,19,4,"4",1.72727272727273,1.78947368421053 +"python-signedjson",-0.4972041941,1.1352937233,-0.7813605442,"https://salsa.debian.org/matrix-team/python-signedjson","https://github.com/matrix-org/python-signedjson.git",2409.117025463,5,10,0,10,14,0,0,14,1,"1",1.66666666666667,2 +"python-slip",0.6771552086,2.9650065243,-0.0680375927,"https://salsa.debian.org/debian/python-slip","https://github.com/nphilipp/python-slip.git",4760.8424189815,5,3,0,4,10,0,0,11,3,"3",1.375,1.90909090909091 +"smmap",0.0842345215,1.8862167897,-0.302978642,"https://salsa.debian.org/python-team/packages/python-smmap","https://github.com/gitpython-developers/smmap",4570.872037037,4,18,0,16,38,0,0,38,3,"3",1.81818181818182,2 +"snuggs",-0.4089829703,1.0919909019,-0.6715786054,"https://salsa.debian.org/debian-gis-team/python-snuggs","https://github.com/mapbox/snuggs.git",1698.5099305556,2,7,0,5,16,0,0,16,1,"1",1.77777777777778,2 +"socketpool",-0.433473063,1.9120698535,-1.1349538282,"https://salsa.debian.org/python-team/packages/python-socketpool","https://github.com/benoitc/socketpool",2141.4605208333,0,17,0,11,31,0,0,32,1,"1",2,1.96875 +"PySocksipyChain",-0.0678442589,2.0576051001,-0.7593283222,"https://salsa.debian.org/freedombox-team/python-socksipychain","https://github.com/pagekite/PySocksipyChain.git",3262.1183564815,1,7,0,4,12,0,0,12,2,"2",1.875,2 +"pysrp",-0.2655598789,2.0901350297,-0.982879077,"https://salsa.debian.org/python-team/packages/python-srp","https://github.com/cocagne/pysrp",4536.7902777778,2,26,0,14,45,0,0,45,3,"3",1.92857142857143,2 +"python-ssdeep",-1.6753783276,-0.7457424439,-1.8662568075,"https://salsa.debian.org/python-team/packages/python-ssdeep","https://github.com/DinoTools/python-ssdeep/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA +"static3",-2.1484350509,0.7824659551,-2.9204988941,"https://salsa.debian.org/debian/python-static3","https://github.com/rmohr/static3",1017.1397800926,0,5,0,4,21,0,0,21,1,"1",2,2 +"stopit",-1.4382358759,1.0640373111,-2.3707053284,"https://salsa.debian.org/python-team/packages/python-stopit","https://github.com/glenfant/stopit",2025.0025810185,3,4,0,7,38,0,0,38,1,"1",1.57142857142857,2 +"python-subprocess32",0.809721279,3.7269442727,-0.0005664334,"https://salsa.debian.org/python-team/modules/python-subprocess32","https://github.com/google/python-subprocess32",2769.8086226852,4,6,0,6,75,0,0,75,2,"2",1.6,2 +"python-sunlight",-0.4386787931,3.6650119727,-1.7599151869,"https://salsa.debian.org/python-team/modules/python-sunlight","https://github.com/sunlightlabs/python-sunlight",1218.8703009259,0,11,0,8,23,0,0,25,1,"1",2,1.92 +"python-tblib",-0.7353049539,0.9990220369,-1.1483402151,"https://salsa.debian.org/python-team/packages/python-tblib","https://github.com/ionelmc/python-tblib",3634.6597453704,5,11,0,12,50,0,0,51,2,"2",1.6875,1.98039215686275 +"urlobject",-1.4032067102,1.0645121312,-1.9682182483,"https://salsa.debian.org/python-team/packages/python-urlobject","https://github.com/zacharyvoase/urlobject",3098.5456481482,4,10,0,8,31,0,0,31,2,"2",1.71428571428571,2 +"urwidtrees",0.4916470757,4.0558334655,-0.5275660918,"https://salsa.debian.org/python-team/packages/python-urwidtrees","https://github.com/pazz/urwidtrees/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA +"python-sdk",-2.1064074455,0.1631136587,-2.60808327,"https://salsa.debian.org/pkg-security-team/python-vulndb","https://github.com/vulndb/python-sdk",1623.0260300926,0,3,0,2,5,0,0,5,1,"1",2,2 +"word_cloud",-2.3533134617,-0.117333833,-2.7862995006,"https://salsa.debian.org/python-team/packages/python-wordcloud","https://github.com/amueller/word_cloud",4051.6273842593,33,54,0,65,30,0,1,89,3,"3",1.62068965517241,1.33707865168539 +"wsproto",0.0162269703,2.3090059731,-0.4249971154,"https://salsa.debian.org/python-team/packages/python-wsproto","https://github.com/python-hyper/wsproto/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA +"python3-xapp",0.4966659567,2.7934932391,-0.0692386084,"https://salsa.debian.org/cinnamon-team/python-xapp","https://github.com/linuxmint/python3-xapp.git",2312.6997685185,5,4,0,7,13,0,0,13,1,"1",1.44444444444444,2 +"python-xeddsa",-1.1633252234,1.3819292376,-1.7395228535,"https://salsa.debian.org/python-team/packages/python-xeddsa","https://github.com/Syndace/python-xeddsa",1709.0088425926,1,4,0,1,2,0,0,2,1,"1",1.8,2 +"xlrd3",0.2419722546,1.6921113748,-0.1509001314,"https://salsa.debian.org/python-team/packages/python-xlrd","https://github.com/Dragon2fly/xlrd3.git",4601.1105092593,9,44,0,35,8,0,0,42,3,"3",1.83018867924528,1.19047619047619 +"xmltodict",0.5981063759,3.2438940023,-0.1054526563,"https://salsa.debian.org/debian/python-xmltodict","https://github.com/martinblech/xmltodict.git",3981.1987152778,26,29,0,41,54,0,1,89,3,"3",1.52727272727273,1.60674157303371 +"xopen",-0.3435053785,1.7701848391,-0.7787807244,"https://salsa.debian.org/python-team/packages/python-xopen","https://github.com/marcelm/xopen/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA +"pyzor",0.91715325,1.9335464362,0.3494382533,"https://salsa.debian.org/python-team/packages/pyzor","https://github.com/SpamExperts/pyzor",5279.2096064815,6,19,1,17,10,0,0,24,4,"4",1.76,1.41666666666667 +"q2templates",-5.0482247015,-2.7964556336,-5.4769511928,"https://salsa.debian.org/med-team/q2templates","https://github.com/qiime2/q2templates.git",2619.2390393519,9,8,0,13,13,0,0,15,1,"1",1.47058823529412,1.86666666666667 +"q4wine-debian",-0.1511094825,0.0770464397,-0.2120059522,"https://github.com/tehnick/q4wine-debian","https://github.com/tehnick/q4wine-debian",4144.3286111111,0,1,0,1,0,0,0,1,3,"3",2,1 +"qconf",-0.3811268622,1.6595217121,-0.7762847478,"https://salsa.debian.org/qt-kde-team/extras/qconf","https://github.com/psi-im/qconf.git",5624.6740740741,1,15,0,7,13,0,0,13,4,"4",1.9375,2 +"qdacco",-1.6662726628,-0.4610104246,-2.0217074624,"https://salsa.debian.org/debian/qdacco","https://github.com/cpina/qdacco.git",5691.2413541667,1,6,0,1,5,0,0,5,4,"4",1.85714285714286,2 +"qemuctl",1.3474122059,3.3653108214,0.3818068479,"https://github.com/operatornormal/qemuctl","https://github.com/operatornormal/qemuctl",627.1595486111,3,2,0,1,0,0,0,1,1,"1",1.4,1 +"qjoypad",0.8529794114,3.2612636032,-0.0822850011,"https://github.com/kilobyte/qjoypad/tree/debian","https://github.com/kilobyte/qjoypad",4422.6630092593,2,12,0,10,1,0,0,11,3,"3",1.85714285714286,1.09090909090909 +"qmenu",0.2416596829,3.6062250713,-0.9305566725,"https://github.com/teopost/qmenu","https://github.com/teopost/qmenu",3121.65625,0,12,2,5,5,0,0,6,2,"2",2,1.83333333333333 +"qmidiarp",0.1060884453,2.4093772481,-0.4462133548,"https://salsa.debian.org/multimedia-team/qmidiarp","https://github.com/emuse/qmidiarp.git",5041.9955208333,2,10,0,5,12,0,0,16,4,"4",1.83333333333333,1.75 +"qmidinet",0.3987634563,2.3272584853,-0.2919992565,"https://salsa.debian.org/multimedia-team/qmidinet","https://github.com/rncbc/qmidinet.git",4992.0509143519,1,11,0,4,10,0,0,11,4,"4",1.91666666666667,1.90909090909091 +"qsampler",0.22306551,2.8539174302,-0.5046019625,"https://salsa.debian.org/multimedia-team/qsampler","https://github.com/rncbc/qsampler.git",5737.9962847222,3,14,0,5,5,0,0,7,4,"4",1.82352941176471,1.71428571428571 +"qsynth",0.1425312579,0.7343171417,-0.1064510745,"https://salsa.debian.org/multimedia-team/qsynth","https://github.com/rncbc/qsynth.git",5674.9236458333,3,19,0,7,24,0,0,25,4,"4",1.86363636363636,1.96 +"qtads",0.5108490252,2.4840737536,-0.3393338609,"https://salsa.debian.org/games-team/qtads","https://github.com/realnc/qtads.git",4788.6839583333,5,7,0,10,20,0,0,22,3,"3",1.58333333333333,1.90909090909091 +"qterm",-0.9155978148,-0.4024112301,-1.1525455527,"https://salsa.debian.org/chinese-team/qterm","https://github.com/qterm/qterm",4614.8412384259,1,8,0,4,17,0,1,18,3,"3",1.88888888888889,1.94444444444444 +"ChemmineR",-4.9478723057,-2.463477009,-5.4701350553,"https://salsa.debian.org/r-pkg-team/r-bioc-chemminer","https://github.com/girke-lab/ChemmineR.git",5502.0317476852,2,22,0,10,19,0,0,26,4,"4",1.91666666666667,1.73076923076923 +"GenomicAlignments",-0.0620075073,2.2952168072,-0.6079488331,"https://salsa.debian.org/r-pkg-team/r-bioc-genomicalignments","https://github.com/Bioconductor/GenomicAlignments.git",3637.7668287037,1,21,0,13,35,0,0,39,2,"2",1.95454545454545,1.8974358974359 +"GenomicRanges",-0.3216038801,1.2623780689,-0.6013624703,"https://salsa.debian.org/r-pkg-team/r-bioc-genomicranges","https://github.com/Bioconductor/GenomicRanges.git",4977.821712963,4,35,0,17,53,0,0,59,3,"3",1.8974358974359,1.89830508474576 +"IRanges",-0.2732928737,0.9495069035,-0.572231786,"https://salsa.debian.org/r-pkg-team/r-bioc-iranges","https://github.com/Bioconductor/IRanges.git",5556.7386458333,4,26,0,13,28,0,0,34,4,"4",1.86666666666667,1.82352941176471 +"preprocessCore",-0.5732675432,1.6147898925,-1.0092066733,"https://salsa.debian.org/r-pkg-team/r-bioc-preprocesscore","https://github.com/bmbolstad/preprocessCore.git",2983.7131828704,0,24,0,9,24,0,0,29,2,"2",2,1.82758620689655 +"Rsamtools",-0.2310113342,1.6900769525,-0.6158536063,"https://salsa.debian.org/r-pkg-team/r-bioc-rsamtools","https://github.com/Bioconductor/Rsamtools.git",5200.0497569445,3,23,0,13,61,0,1,68,4,"4",1.88461538461538,1.89705882352941 +"S4Vectors",-0.0375813239,2.2525487662,-0.5982212588,"https://salsa.debian.org/r-pkg-team/r-bioc-s4vectors","https://github.com/Bioconductor/S4Vectors/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA +"XVector",-0.1488435412,2.1308487448,-0.5902275914,"https://salsa.debian.org/r-pkg-team/r-bioc-xvector","https://github.com/Bioconductor/XVector.git",3819.2003935185,0,10,0,5,3,0,0,7,3,"3",2,1.42857142857143 +"animation",-0.3515983765,2.1779345723,-0.9193080299,"https://salsa.debian.org/r-pkg-team/r-cran-animation","https://github.com/yihui/animation/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA +"arm",-0.2157734257,1.5269652897,-0.5053279666,"https://salsa.debian.org/r-pkg-team/r-cran-arm","https://github.com/suyusung/arm.git",2199.2741898148,0,4,0,2,20,0,0,20,1,"1",2,2 +"av",-3.30692254,-1.0664029566,-3.7499442887,"https://salsa.debian.org/r-pkg-team/r-cran-av","https://github.com/ropensci/av.git",1927.0685763889,2,3,0,3,37,0,0,37,1,"1",1.6,2 +"BBmisc",-0.0791867315,2.2103067426,-0.5239193282,"https://salsa.debian.org/r-pkg-team/r-cran-bbmisc","https://github.com/berndbischl/BBmisc/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA +"R-bitops",0.1812196348,2.5081885743,-0.2636167197,"https://salsa.debian.org/r-pkg-team/r-cran-bitops","https://github.com/mmaechler/R-bitops/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA +"bold",-0.3589941343,1.8830194903,-0.7984155261,"https://salsa.debian.org/r-pkg-team/r-cran-bold","https://github.com/ropensci/bold/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA +"crayon",0.2585448991,2.4711889525,-0.1898457145,"https://salsa.debian.org/r-pkg-team/r-cran-crayon","https://github.com/r-lib/crayon/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA +"data.table",0.2136711627,2.3818673171,-0.2205863845,"https://salsa.debian.org/r-pkg-team/r-cran-data.table","https://github.com/Rdatatable/data.table/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA +"lwgeom",0.0058180918,2.4188629892,-0.7327945006,"https://salsa.debian.org/r-pkg-team/r-cran-lwgeom","https://github.com/r-spatial/lwgeom/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA +"matrixcalc",0.635479198,4.3464268954,-0.3463558892,"https://salsa.debian.org/r-pkg-team/r-cran-matrixcalc","https://github.com/TomKellyGenetics/matrixcalc/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA +"mcmc",0.1542552699,2.7368602124,-0.4513098316,"https://salsa.debian.org/r-pkg-team/r-cran-mcmc","https://github.com/cjgeyer/mcmc/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA +"mice",-1.1703228936,1.1700115105,-1.5897791054,"https://salsa.debian.org/r-pkg-team/r-cran-mice","https://github.com/amices/mice/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA +"MNP",-0.0051235593,2.1439929564,-0.4400210306,"https://salsa.debian.org/r-pkg-team/r-cran-mnp","https://github.com/kosukeimai/MNP/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA +"nozzle",-2.8854861587,-0.5978017889,-3.3250463837,"https://salsa.debian.org/r-pkg-team/r-cran-nozzle.r1","https://github.com/parklab/nozzle.git",926.0286111111,0,1,0,1,13,0,0,13,1,"1",2,2 +"r-optparse",-0.2070927617,2.0241027782,-0.6422022567,"https://salsa.debian.org/r-pkg-team/r-cran-optparse","https://github.com/trevorld/r-optparse.git",3364.6461689815,0,11,0,2,23,0,0,23,2,"2",2,2 +"pbdZMQ",0.1891713681,3.4926433557,-0.7475172495,"https://salsa.debian.org/r-pkg-team/r-cran-pbdzmq","https://github.com/snoweye/pbdZMQ/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA +"plyr",0.2396916445,2.3397739545,-0.1920061376,"https://salsa.debian.org/r-pkg-team/r-cran-plyr","https://github.com/hadley/plyr/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA +"ps",0.1035877787,2.5492783444,-0.3466845119,"https://salsa.debian.org/r-pkg-team/r-cran-ps","https://github.com/r-lib/ps/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA +"pscl",0.7428074668,3.4473876545,-0.1554350642,"https://salsa.debian.org/r-pkg-team/r-cran-pscl","https://github.com/atahk/pscl/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA +"rcmdcheck",0.2146726991,2.6895020277,-0.3988188518,"https://salsa.debian.org/r-pkg-team/r-cran-rcmdcheck","https://github.com/r-Lib/rcmdcheck/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA +"rgenoud",-0.3488800713,2.0874491929,-0.9117194293,"https://salsa.debian.org/r-pkg-team/r-cran-rgenoud","https://github.com/JasjeetSekhon/rgenoud/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA +"ritis",-0.2993761764,1.9534734206,-0.7980064599,"https://salsa.debian.org/r-pkg-team/r-cran-ritis","https://github.com/ropensci/ritis.git",3983.0266666667,1,4,0,3,12,0,0,12,3,"3",1.8,2 +"rncl",-0.3371319454,1.9103735604,-0.7874553216,"https://salsa.debian.org/r-pkg-team/r-cran-rncl","https://github.com/fmichonneau/rncl/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA +"RPostgreSQL",0.1055240035,2.6128418992,-0.4853871285,"https://salsa.debian.org/r-pkg-team/r-cran-rpostgresql","https://github.com/tomoakin/RPostgreSQL/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA +"rprotobuf",-0.6366352318,1.6233621016,-1.07827539,"https://salsa.debian.org/r-pkg-team/r-cran-rprotobuf","https://github.com/eddelbuettel/rprotobuf/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA +"rredlist",-0.2938584635,2.0226834023,-0.7943140683,"https://salsa.debian.org/r-pkg-team/r-cran-rredlist","https://github.com/ropensci/rredlist/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA +"truncnorm",-0.0250364198,2.0343035584,-0.4668055836,"https://salsa.debian.org/r-pkg-team/r-cran-truncnorm","https://github.com/olafmersmann/truncnorm/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA +"r-utf8",0.4292727883,3.0821382028,-0.1776413564,"https://salsa.debian.org/r-pkg-team/r-cran-utf8","https://github.com/patperry/r-utf8/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA +"vcdExtra",-0.1359675027,2.0732853363,-0.5645165568,"https://salsa.debian.org/r-pkg-team/r-cran-vcdextra","https://github.com/friendly/vcdExtra.git",5383.4657523148,0,9,0,3,12,0,0,12,4,"4",2,2 +"vioplot",-0.5117688173,1.754135969,-0.9412408999,"https://salsa.debian.org/r-pkg-team/r-cran-vioplot","https://github.com/TomKellyGenetics/vioplot",2457.8733912037,2,6,0,3,10,0,0,11,1,"1",1.75,1.90909090909091 +"worrms",-0.5997090341,1.1419114747,-0.9334770127,"https://salsa.debian.org/r-pkg-team/r-cran-worrms","https://github.com/ropensci/worrms/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA +"Zelig",0.7234179385,3.5136261784,-0.1954309797,"https://salsa.debian.org/r-pkg-team/r-cran-zelig","https://github.com/IQSS/Zelig/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA +"radare2",-0.001835483,0.290941294,-0.1737536018,"https://salsa.debian.org/pkg-security-team/radare2","https://github.com/radareorg/radare2/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA +"radcli",0.8077891464,3.0284268528,0.04850184,"https://salsa.debian.org/debian/radcli","https://github.com/radcli/radcli",0.0082986111,10,25,0,19,27,0,0,35,1,"1",1.71428571428571,1.77142857142857 +"radium_compressor",0.1355972195,2.8572373451,-0.7243626073,"https://salsa.debian.org/multimedia-team/radium-compressor","https://github.com/kmatheussen/radium_compressor.git",2426.0817361111,0,1,0,1,4,0,0,4,1,"1",2,2 +"rainbow",-2.2315150038,-0.9649972127,-2.481288314,"https://salsa.debian.org/js-team/rainbow.js","https://github.com/ccampbell/rainbow/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA +"rake-compiler",-0.1765905828,1.968096231,-0.8991055528,"https://salsa.debian.org/ruby-team/rake-compiler","https://github.com/rake-compiler/rake-compiler/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA +"rapache",-1.9452855915,-0.2626388012,-2.421875321,"https://salsa.debian.org/r-pkg-team/rapache","https://github.com/jeffreyhorner/rapache.git",4155.5934953704,1,13,0,6,35,0,0,35,3,"3",1.92857142857143,2 +"raphael",0.6406275138,3.7045765255,-0.2507834388,"https://salsa.debian.org/debian/raphael","https://github.com/DmitryBaranovskiy/raphael/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA +"redmine_local_avatars",-1.4572727561,1.4827307788,-2.2601628352,"https://salsa.debian.org/debian/redmine-plugin-local-avatars","https://github.com/ncoders/redmine_local_avatars",3991.5587615741,3,11,0,9,47,0,0,48,3,"3",1.78571428571429,1.97916666666667 +"ree",0.455206434,2.7126650543,-0.2943021607,"https://salsa.debian.org/debian/ree","https://github.com/alexmyczko/ree",1112.0390740741,3,1,0,2,2,0,0,3,1,"1",1.25,1.66666666666667 +"remaster-iso",-2.0473516929,0.1202211372,-2.4770101415,"https://github.com/unixabg/remaster-iso","https://github.com/unixabg/remaster-iso",251.8044791667,1,3,0,3,5,0,0,5,1,"1",1.75,2 +"python-requests-aws",-0.7617204879,2.8252172293,-1.7279435269,"https://salsa.debian.org/python-team/packages/requests-aws","https://github.com/tax/python-requests-aws",1319.2575,2,12,1,8,18,0,0,18,1,"1",1.85714285714286,2 +"rerun",-0.4314612854,3.3152754481,-1.4987677111,"https://salsa.debian.org/ruby-team/rerun","https://github.com/alexch/rerun/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA +"resvg",-0.8706965662,2.5429179421,-1.7032916571,"https://salsa.debian.org/debian/resvg","https://github.com/RazrFalcon/resvg.git",2182.7898726852,46,8,0,47,30,0,0,65,1,"1",1.14814814814815,1.46153846153846 +"rexical",-1.8414750192,0.9895052788,-2.7520386326,"https://salsa.debian.org/ruby-team/rexical","https://github.com/tenderlove/rexical",5447.083912037,2,10,0,9,23,0,2,29,4,"4",1.83333333333333,1.79310344827586 +"ripe-atlas-cousteau",-0.9764944882,1.3924863314,-1.4702991314,"https://salsa.debian.org/python-team/packages/ripe-atlas-cousteau","https://github.com/RIPE-NCC/ripe-atlas-cousteau.git",3286.9945949074,5,15,0,13,37,0,0,39,2,"2",1.75,1.94871794871795 +"robocut",-0.2824151439,2.3754574352,-1.0923195505,"https://github.com/alpharesearch/robocut","https://github.com/alpharesearch/robocut",831.4363194444,0,6,0,3,0,0,0,3,1,"1",2,1 +"robotfindskitten-pkg-debian",0.0179376982,1.3078276454,-0.485626997,"https://github.com/rfinnie/robotfindskitten-pkg-debian","https://github.com/rfinnie/robotfindskitten-pkg-debian",1629.5291319445,3,1,0,3,0,0,0,3,1,"1",1.25,1 +"rolo",-0.0498132259,2.1330027792,-0.8216828066,"https://salsa.debian.org/debian/rolo","https://github.com/libvc/rolo",1738.2993634259,2,2,0,2,2,0,0,2,1,"1",1.5,2 +"rospack",-0.2414662592,1.0688853941,-0.5553517117,"https://salsa.debian.org/science-team/ros-rospack","https://github.com/ros/rospack.git",3438.9073958333,20,26,0,26,22,0,0,42,2,"2",1.56521739130435,1.52380952380952 +"rospkg",-0.0548646672,1.8580305855,-0.5008277906,"https://salsa.debian.org/science-team/ros-rospkg","https://github.com/ros-infrastructure/rospkg.git",4295.6529861111,33,59,0,64,29,0,0,79,3,"3",1.64130434782609,1.36708860759494 +"std_msgs",-0.0206690342,2.386166873,-0.5747059717,"https://salsa.debian.org/science-team/ros-std-msgs","https://github.com/ros/std_msgs.git",3274.7244560185,3,17,0,9,19,0,0,20,2,"2",1.85,1.95 +"rsh-redone",0.2434579926,2.4765843324,-0.7125516261,"https://salsa.debian.org/debian/rsh-redone","https://github.com/gsliepen/rsh-redone",3762.4461458333,1,2,0,2,0,0,0,2,2,"2",1.66666666666667,1 +"rt-extension-repeatticket",-1.2713455525,2.448057755,-2.2206005858,"https://salsa.debian.org/request-tracker-team/rt-extension-repeatticket","https://github.com/bestpractical/rt-extension-repeatticket",4204.3307407408,0,5,0,4,3,0,0,7,3,"3",2,1.42857142857143 +"rtkit",1.5914934939,3.4753341698,0.6818583583,"https://salsa.debian.org/multimedia-team/rtkit","https://github.com/heftig/rtkit",3958.7431828704,18,3,0,13,43,0,0,51,3,"3",1.14285714285714,1.84313725490196 +"actionpack-action_caching",-0.0195395793,2.0209197518,-0.4608551365,"https://salsa.debian.org/ruby-team/ruby-actionpack-action-caching","https://github.com/rails/actionpack-action_caching/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA +"actionpack-page_caching",-2.0979772282,1.0629868716,-2.9170878445,"https://salsa.debian.org/ruby-team/ruby-actionpack-page-caching","https://github.com/rails/actionpack-page_caching/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA +"bacon",-1.4997697176,0.69875474,-2.0358441625,"https://salsa.debian.org/ruby-team/ruby-bacon","https://github.com/leahneukirchen/bacon",5364.0763657407,3,17,0,13,38,0,0,42,4,"4",1.85,1.9047619047619 +"base62",-3.2007890763,-0.5710294937,-3.7408477417,"https://salsa.debian.org/ruby-team/ruby-base62","https://github.com/jtzemp/base62.git",1973.6897222222,1,5,0,3,13,0,1,15,1,"1",1.83333333333333,1.86666666666667 +"batch-loader",-1.39118114,1.051907531,-1.9658421191,"https://salsa.debian.org/ruby-team/ruby-batch-loader","https://github.com/exAspArk/batch-loader/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA +"bcrypt-ruby",-0.1670366207,2.5485813659,-0.7840534303,"https://salsa.debian.org/ruby-team/ruby-bcrypt","https://github.com/bcrypt-ruby/bcrypt-ruby/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA +"ruby-beautify",-1.8179395924,0.5723544617,-2.4288221334,"https://salsa.debian.org/ruby-team/ruby-beautify.git","https://github.com/erniebrodeur/ruby-beautify",2708.0809837963,1,19,0,16,45,0,0,50,1,"1",1.95,1.9 +"bogus",-2.97011868,-1.1536023268,-3.3242631007,"https://salsa.debian.org/ruby-team/ruby-bogus","https://github.com/psyho/bogus/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA +"bootsnap",0.4969446581,4.0467699375,-0.4453655481,"https://salsa.debian.org/ruby-team/ruby-bootsnap","https://github.com/Shopify/bootsnap/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA +"mongo-ruby-driver",-0.4876456206,1.8841260262,-1.1170056726,"https://salsa.debian.org/ruby-team/ruby-bson","https://github.com/mongodb/mongo-ruby-driver/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA +"buff-config",-2.0406131429,-0.5802367653,-2.3469509456,"https://salsa.debian.org/ruby-team/ruby-buff-config","https://github.com/berkshelf/buff-config/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA +"buff-extensions",-1.7001314331,0.6961340583,-2.1479955125,"https://salsa.debian.org/ruby-team/ruby-buff-extensions","https://github.com/RiotGames/buff-extensions",1162.5226851852,0,5,0,3,12,0,0,12,1,"1",2,2 +"builder",0.2891790514,2.0567550581,-0.1483490017,"https://salsa.debian.org/ruby-team/ruby-builder","https://github.com/tenderlove/builder/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA +"byebug",0.1180553967,2.3001711673,-0.3220977863,"https://salsa.debian.org/ruby-team/ruby-byebug","https://github.com/deivid-rodriguez/byebug/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA +"capture-output",-2.8922262934,-0.7342713061,-3.3221878931,"https://salsa.debian.org/ruby-team/ruby-capture-output","https://github.com/jpastuszek/capture-output",0.0173611111,0,1,0,1,1,0,0,2,1,"1",2,1.5 +"capybara",0.2496990629,2.4303429017,-0.4282559769,"https://salsa.debian.org/ruby-team/ruby-capybara","https://github.com/teamcapybara/capybara/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA +"cassiopee",-1.5851518029,1.3271244261,-2.3664077484,"https://salsa.debian.org/ruby-team/ruby-cassiopee","https://github.com/osallou/cassiopee/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA +"celluloid",0.0913806587,1.1865611887,-0.2892192569,"https://salsa.debian.org/ruby-team/ruby-celluloid","https://github.com/celluloid/celluloid/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA +"certificate_authority",-2.001867048,0.4618631999,-2.7039312007,"https://salsa.debian.org/ruby-team/ruby-certificate-authority","https://github.com/cchandler/certificate_authority/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA +"cmdparse",0.6782564731,4.5071204079,-0.416431913,"https://salsa.debian.org/ruby-team/ruby-cmdparse","https://github.com/gettalong/cmdparse/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA +"color",-1.6594930763,0.7881397104,-2.2203703357,"https://salsa.debian.org/ruby-team/ruby-color","https://github.com/halostatue/color",4994.1460185185,1,11,1,4,30,0,0,30,4,"4",1.91666666666667,2 +"colorator",0.17562997,2.3024347781,-0.2637255242,"https://salsa.debian.org/ruby-team/ruby-colorator","https://github.com/octopress/colorator/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA +"combustion",-2.7077626864,-0.5070219842,-3.2814670287,"https://salsa.debian.org/ruby-team/ruby-combustion","https://github.com/pat/combustion/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA +"commander",-0.3544313341,2.5524463745,-1.091065268,"https://salsa.debian.org/ruby-team/ruby-commander","https://github.com/commander-rb/commander/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA +"connection_pool",-0.107782789,2.7608316302,-0.9083898684,"https://salsa.debian.org/ruby-team/ruby-connection-pool","https://github.com/mperham/connection_pool/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA +"coveralls-ruby",-1.0639842925,0.6886883657,-1.6214631931,"https://salsa.debian.org/ruby-team/ruby-coveralls","https://github.com/lemurheavy/coveralls-ruby/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA +"crb-blast",-0.6967501476,1.5636879643,-1.4854285145,"https://salsa.debian.org/ruby-team/ruby-crb-blast","https://github.com/cboursnell/crb-blast",1070.1020717593,0,5,0,2,15,0,0,15,1,"1",2,2 +"css_parser",0.4702988432,3.0731837512,-0.226276662,"https://salsa.debian.org/ruby-team/ruby-css-parser","https://github.com/premailer/css_parser/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA +"curb",-0.9519936286,0.5852000443,-1.3702997899,"https://salsa.debian.org/ruby-team/ruby-curb","https://github.com/taf2/curb/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA +"dalli",-0.7493522151,1.7345835465,-1.4848953309,"https://salsa.debian.org/ruby-team/ruby-dalli","https://github.com/petergoldstein/dalli/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA +"eim_xml",-0.7146782347,2.4094998812,-1.5508131873,"https://salsa.debian.org/ruby-team/ruby-eim-xml","https://github.com/hirakuro/eim_xml/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA +"em-http-request",-0.182257018,2.1432197933,-1.011053135,"https://salsa.debian.org/ruby-team/ruby-em-http-request","https://github.com/igrigorik/em-http-request/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA +"em-redis",-2.4322275314,0.3220252422,-3.2383595542,"https://salsa.debian.org/ruby-team/ruby-em-redis","https://github.com/libc/em-redis",3058.3058101852,3,10,0,6,7,0,0,10,2,"2",1.76923076923077,1.7 +"encryptor",0.4811221705,4.0560529867,-0.7455390491,"https://salsa.debian.org/ruby-team/ruby-encryptor","https://github.com/attr-encrypted/encryptor",2635.9583564815,1,9,0,5,53,0,0,54,1,"1",1.9,1.98148148148148 +"entypo-rails",0.5391017786,4.3530001784,-0.5148206393,"https://salsa.debian.org/ruby-team/ruby-entypo-rails","https://github.com/lwe/entypo-rails",1757.4358333333,1,10,0,7,20,0,0,20,1,"1",1.90909090909091,2 +"enumerize",-3.5842960195,-1.0600757701,-4.2631150762,"https://salsa.debian.org/ruby-team/ruby-enumerize","https://github.com/brainspec/enumerize/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA +"escape_utils",-0.3520723582,1.3204538371,-0.8030228346,"https://salsa.debian.org/ruby-team/ruby-escape-utils","https://github.com/brianmario/escape_utils.git",4731.6076041667,5,24,0,25,33,0,0,45,3,"3",1.82758620689655,1.73333333333333 +"espeak-ruby",-0.7286751247,2.0352078637,-1.4874218872,"https://salsa.debian.org/ruby-team/ruby-espeak","https://github.com/dejan/espeak-ruby/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA +"ethon",-0.0042860534,2.2301309151,-0.5633876951,"https://salsa.debian.org/ruby-team/ruby-ethon","https://github.com/typhoeus/ethon/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA +"excon",0.3241647951,2.1161660144,-0.1827284225,"https://salsa.debian.org/ruby-team/ruby-excon","https://github.com/excon/excon/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA +"execjs",0.8128959283,3.6876363054,-0.0541606598,"https://salsa.debian.org/ruby-team/ruby-execjs","https://github.com/rails/execjs/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA +"factory_bot",-2.8031110385,-0.7539374887,-3.2965562449,"https://salsa.debian.org/ruby-team/ruby-factory-bot","https://github.com/thoughtbot/factory_bot/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA +"factory_bot_rails",-4.3362753842,-1.1849251406,-5.2964482175,"https://salsa.debian.org/ruby-team/ruby-factory-bot-rails","https://github.com/thoughtbot/factory_bot_rails/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA +"faker",-2.043268084,0.4558232112,-2.7260545607,"https://salsa.debian.org/ruby-team/ruby-faker","https://github.com/faker-ruby/faker/issues/new",2746.3319791667,2,17,0,0,0,0,0,881,2,"2",1.89473684210526,1 +"ruby-fcgi-ng",0.3005043747,2.2153527182,-0.3456056618,"https://salsa.debian.org/ruby-team/ruby-fcgi","https://github.com/alphallc/ruby-fcgi-ng",3559.9222685185,1,6,0,5,7,0,0,7,2,"2",1.85714285714286,2 +"ferret",-1.152482197,0.9802706874,-1.8377454457,"https://salsa.debian.org/ruby-team/ruby-ferret","https://github.com/dbalmain/ferret/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA +"ffaker",-2.5489714355,0.5028353652,-3.5038139593,"https://salsa.debian.org/ruby-team/ruby-ffaker","https://github.com/ffaker/ffaker/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA +"ffi",0.7507411929,2.0786767636,0.1677842861,"https://salsa.debian.org/ruby-team/ruby-ffi","https://github.com/ffi/ffi/wiki/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA +"ffi-rzmq",-1.7723964358,0.1072926119,-2.431946797,"https://salsa.debian.org/ruby-team/ruby-ffi-rzmq","https://github.com/chuckremes/ffi-rzmq",3424.7133912037,1,37,0,26,23,0,0,39,2,"2",1.97368421052632,1.58974358974359 +"filepath",-2.3053481268,0.1409903961,-2.9510491569,"https://salsa.debian.org/ruby-team/ruby-filepath","https://github.com/gioele/filepath/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA +"fission",-1.6562095743,0.8388115306,-2.2192481171,"https://salsa.debian.org/ruby-team/ruby-fission","https://github.com/thbishop/fission",876.3192708333,0,10,0,7,20,0,0,20,1,"1",2,2 +"flexmock",-0.3454878367,2.571112926,-1.0719182939,"https://salsa.debian.org/ruby-team/ruby-flexmock","https://github.com/doudou/flexmock/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA +"fog-core",0.6091506734,3.4479009172,-0.153332088,"https://salsa.debian.org/ruby-team/ruby-fog-core","https://github.com/fog/fog-core/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA +"fog-local",-0.5604968871,1.9424075855,-1.1725410205,"https://salsa.debian.org/ruby-team/ruby-fog-local","https://github.com/fog/fog-local",5023.4471759259,4,29,0,20,20,0,0,31,4,"4",1.87878787878788,1.64516129032258 +"graffiti",-1.4846935384,1.5503379929,-2.3930105658,"https://salsa.debian.org/ruby-team/ruby-graffiti","https://github.com/angdraug/graffiti",3536.2679166667,0,3,0,1,2,0,0,2,2,"2",2,2 +"grape",-0.4350415295,1.4006419917,-1.070629589,"https://salsa.debian.org/ruby-team/ruby-grape","https://github.com/ruby-grape/grape/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA +"Ruby-Graphviz",-0.281553724,2.1524260723,-1.1267460692,"https://salsa.debian.org/ruby-team/ruby-graphviz","https://github.com/glejeune/Ruby-Graphviz/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA +"rb-gsl",-0.3230766707,0.701457517,-0.7464638333,"https://salsa.debian.org/ruby-team/ruby-gsl","https://github.com/SciRuby/rb-gsl/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA +"haml",-0.2288560111,0.7789985582,-0.5585413968,"https://salsa.debian.org/ruby-team/ruby-haml","https://github.com/haml/haml/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA +"haml-rails",-1.7986736177,0.2769400484,-2.4010715421,"https://salsa.debian.org/ruby-team/ruby-haml-rails","https://github.com/haml/haml-rails/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA +"hamster",0.1910108771,2.6568022387,-0.3608024404,"https://salsa.debian.org/ruby-team/ruby-hamster","https://github.com/hamstergem/hamster/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA +"hangouts-chat",-1.2144339097,0.4818108524,-1.5637566918,"https://salsa.debian.org/ruby-team/ruby-hangouts-chat","https://github.com/enzinia/hangouts-chat",1065.9778472222,3,4,0,3,4,0,0,4,1,"1",1.57142857142857,2 +"hashie",0.5722550457,3.4085323574,-0.2355411618,"https://salsa.debian.org/ruby-team/ruby-hashie","https://github.com/hashie/hashie/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA +"highline",0.2453167047,2.4988399297,-0.2235846904,"https://salsa.debian.org/ruby-team/ruby-highline","https://github.com/JEG2/highline/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA +"hitimes",0.1068100876,2.6613098357,-0.447701455,"https://salsa.debian.org/ruby-team/ruby-hitimes","https://github.com/copiousfreetime/hitimes/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA +"html-pipeline",-0.3782141806,2.4999259043,-1.1470246908,"https://salsa.debian.org/ruby-team/ruby-html-pipeline","https://github.com/jch/html-pipeline",4034.7769328704,33,88,0,93,41,0,0,110,3,"3",1.72727272727273,1.37272727272727 +"html2haml",-0.284722491,1.1708771552,-0.6449129827,"https://salsa.debian.org/ruby-team/ruby-html2haml","https://github.com/haml/html2haml/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA +"httparty",-0.2296319294,1.8101133693,-0.8217200797,"https://salsa.debian.org/ruby-team/ruby-httparty","https://github.com/jnunemaker/httparty/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA +"i18n",0.8152415757,2.7696084069,0.1031413415,"https://salsa.debian.org/ruby-team/ruby-i18n","https://github.com/ruby-i18n/i18n/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA +"i18n-inflector-rails",-3.6101910392,-1.2035908486,-4.2660614395,"https://salsa.debian.org/ruby-team/ruby-i18n-inflector-rails","https://github.com/siefca/i18n-inflector-rails/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA +"icalendar",-0.9967703811,1.7616614381,-1.7133045592,"https://salsa.debian.org/ruby-team/ruby-icalendar","https://github.com/icalendar/icalendar/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA +"ice_cube",-2.9447850831,0.3245689035,-3.696715811,"https://salsa.debian.org/ruby-team/ruby-ice-cube","http://seejohnrun.github.com/ice_cube/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA +"image_science",-0.6109855428,1.3356911263,-1.2647438358,"https://salsa.debian.org/ruby-team/ruby-image-science","https://github.com/seattlerb/image_science/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA +"influxdb-ruby",0.0573197432,3.227120433,-0.9690594839,"https://salsa.debian.org/ruby-team/ruby-influxdb","https://github.com/InfluxCommunity/influxdb-ruby/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA +"inherited_resources",-4.4805244395,-1.6125821355,-5.323696982,"https://salsa.debian.org/ruby-team/ruby-inherited-resources","https://github.com/activeadmin/inherited_resources/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA +"rubyinline",-0.5488463078,1.586460929,-1.1539952628,"https://salsa.debian.org/ruby-team/ruby-inline","https://github.com/seattlerb/rubyinline.git",5600.4261805556,0,4,0,3,40,0,0,40,4,"4",2,2 +"innertube",-0.8869903201,1.6021467977,-1.6544158523,"https://salsa.debian.org/ruby-team/ruby-innertube","https://github.com/basho/innertube.git",1008.2290162037,0,4,0,4,8,0,0,8,1,"1",2,2 +"ipaddress",0.3785874101,3.1933979431,-0.2196161692,"https://salsa.debian.org/ruby-team/ruby-ipaddress","https://github.com/bluemonk/ipaddress/issues/new",2746.3319791667,2,17,0,0,0,0,0,56,2,"2",1.89473684210526,1 +"jar-dependencies",0.0460603946,2.8173117768,-0.7407876075,"https://salsa.debian.org/ruby-team/ruby-jar-dependencies","https://github.com/mkristian/jar-dependencies",3114.2440277778,4,15,0,15,42,0,1,45,2,"2",1.78947368421053,1.93333333333333 +"jekyll-commonmark",-3.9057611496,-1.6518132292,-4.3433705046,"https://salsa.debian.org/ruby-team/ruby-jekyll-commonmark","https://github.com/jekyll/jekyll-commonmark/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA +"jekyll-feed",0.1675771135,2.2494684672,-0.2627259539,"https://salsa.debian.org/ruby-team/ruby-jekyll-feed","https://github.com/jekyll/jekyll-feed/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA +"joiner",-0.899573388,2.1329741465,-1.7030771732,"https://salsa.debian.org/ruby-team/ruby-joiner","https://github.com/pat/joiner/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA +"jquery-atwho-rails",-0.7423375517,1.4980767196,-1.2841911773,"https://salsa.debian.org/ruby-team/ruby-jquery-atwho-rails","https://github.com/ichord/jquery-atwho-rails/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA +"locale",0.3803802231,1.524276319,-0.0365821889,"https://salsa.debian.org/ruby-team/ruby-locale","https://github.com/ruby-gettext/locale/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA +"magic",-0.136206368,2.210685595,-0.7957036211,"https://salsa.debian.org/ruby-team/ruby-magic","https://github.com/qoobaa/magic",2808.4621990741,0,9,0,5,8,0,0,8,2,"2",2,2 +"mail-gpg",-0.9409015952,1.9853520354,-1.675246259,"https://salsa.debian.org/ruby-team/ruby-mail-gpg","https://github.com/jkraemer/mail-gpg",4267.9559722222,18,136,0,11,30,0,0,30,3,"3",1.88311688311688,2 +"markdown-it-html5-embed",-2.8648647448,0.5943602868,-3.688121554,"https://salsa.debian.org/ruby-team/ruby-markdown-it-html5-embed","https://github.com/cmrd-senya/markdown-it-html5-embed",2489.0705555556,3,10,0,7,15,0,0,15,1,"1",1.76923076923077,2 +"maxitest",-2.3507463091,0.2011168043,-2.9821664947,"https://salsa.debian.org/ruby-team/ruby-maxitest","https://github.com/grosser/maxitest",3302.3780092593,0,10,0,6,20,0,0,20,2,"2",2,2 +"method_source",0.3967690887,3.2318024051,-0.2913605087,"https://salsa.debian.org/ruby-team/ruby-method-source","https://github.com/banister/method_source",3988.6090393519,4,19,0,20,55,0,0,56,3,"3",1.82608695652174,1.98214285714286 +"ruby-mime-types",0.3717629365,2.6878654539,-0.1300864966,"https://salsa.debian.org/ruby-team/ruby-mime-types","https://github.com/mime-types/ruby-mime-types/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA +"minimagick",-1.0439670842,0.2157840612,-1.3997145193,"https://salsa.debian.org/ruby-team/ruby-mini-magick","https://github.com/minimagick/minimagick/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA +"minitar",-0.0660695838,1.7554167483,-0.5639163741,"https://salsa.debian.org/ruby-team/ruby-minitar","https://github.com/halostatue/minitar",5658.6576851852,8,6,1,8,33,0,0,33,4,"4",1.42857142857143,2 +"minitest",0.6291543197,3.2530425688,0.0059259645,"https://salsa.debian.org/ruby-team/ruby-minitest","https://github.com/seattlerb/minitest/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA +"minitest-around",-1.7698068776,0.7510788114,-2.5114054563,"https://salsa.debian.org/ruby-team/ruby-minitest-around","https://github.com/splattael/minitest-around",2552.4467708333,2,14,0,7,17,0,0,17,1,"1",1.875,2 +"minitest-shared_description",-3.2057434289,-0.7536793446,-3.735520243,"https://salsa.debian.org/ruby-team/ruby-minitest-shared-description","https://github.com/jeremyevans/minitest-shared_description",2605.2266666667,0,2,0,2,2,0,0,2,1,"1",2,2 +"mixlib-install",-0.6385298321,2.1889207953,-1.4847448361,"https://salsa.debian.org/ruby-team/ruby-mixlib-install","https://github.com/chef/mixlib-install/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA +"mocha",-0.0854006271,1.5328416557,-0.5865753787,"https://salsa.debian.org/ruby-team/ruby-mocha","https://github.com/freerange/mocha/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA +"mousetrap-rails",-0.5414473391,2.2995115053,-1.3022888739,"https://salsa.debian.org/ruby-team/ruby-mousetrap-rails","https://github.com/kugaevsky/mousetrap-rails",2627.8625810185,0,4,0,3,14,0,2,16,1,"1",2,1.875 +"mustache",0.3863898236,2.9819707709,-0.4052274614,"https://salsa.debian.org/ruby-team/ruby-mustache","https://github.com/defunkt/mustache",4729.4908680556,23,58,1,62,26,0,0,84,3,"3",1.71604938271605,1.30952380952381 +"mysql2",0.3134512975,1.4731032493,-0.1330082155,"https://salsa.debian.org/ruby-team/ruby-mysql2","https://github.com/brianmario/mysql2",4877.8413194445,60,107,4,128,39,0,0,163,3,"3",1.64071856287425,1.23926380368098 +"net-sftp",0.512822573,2.6427692706,-0.1200757583,"https://salsa.debian.org/ruby-team/ruby-net-sftp","https://github.com/net-ssh/net-sftp/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA +"net-ssh",0.3423712483,1.5708505632,-0.0962002825,"https://salsa.debian.org/ruby-team/ruby-net-ssh","https://github.com/net-ssh/net-ssh/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA +"net-ssh-gateway",0.0949247841,2.4061879488,-0.3883582933,"https://salsa.debian.org/ruby-team/ruby-net-ssh-gateway","https://github.com/net-ssh/net-ssh-gateway/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA +"netrc",0.6689404268,3.5600163117,-0.1237597689,"https://salsa.debian.org/ruby-team/ruby-netrc","https://github.com/heroku/netrc",3633.5661342593,0,30,0,18,43,0,0,45,2,"2",2,1.95555555555556 +"nokogiri",0.0984970577,0.7468154749,-0.1063244283,"https://salsa.debian.org/ruby-team/ruby-nokogiri","https://github.com/sparklemotion/nokogiri/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA +"rubyntlm",-0.0624150923,2.5862392951,-0.7205122229,"https://salsa.debian.org/ruby-team/ruby-ntlm","https://github.com/winrb/rubyntlm/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA +"oauth-ruby",0.0832778896,2.8453147176,-0.5926012173,"https://salsa.debian.org/ruby-team/ruby-oauth","https://github.com/oauth-xx/oauth-ruby",5341.0796643519,47,77,3,86,0,0,0,86,4,"4",1.62096774193548,1 +"oauth2",-0.165607622,2.3195911932,-0.9005135088,"https://salsa.debian.org/ruby-team/ruby-oauth2","https://github.com/intridea/oauth2",4856.2432986111,41,112,2,108,0,0,0,108,3,"3",1.73202614379085,1 +"oily_png",0.1453183816,3.1507405338,-0.7131154739,"https://salsa.debian.org/ruby-team/ruby-oily-png","https://github.com/wvanbergen/oily_png/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA +"oj",0.2009601344,1.5648205522,-0.1380338639,"https://salsa.debian.org/ruby-team/ruby-oj","https://github.com/ohler55/oj/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA +"ruby-ole",-0.6621692167,1.4303576538,-1.3055179465,"https://salsa.debian.org/ruby-team/ruby-ole","https://github.com/aquasync/ruby-ole/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA +"omniauth-cas3",-0.5952547028,1.8217576227,-1.2467001517,"https://salsa.debian.org/ruby-team/ruby-omniauth-cas3","https://github.com/tduehr/omniauth-cas3",3904.2384027778,7,20,0,16,5,0,0,17,3,"3",1.74074074074074,1.29411764705882 +"omniauth_crowd",-0.5393910023,2.0196041023,-1.2327402235,"https://salsa.debian.org/ruby-team/ruby-omniauth-crowd","https://github.com/robdimarco/omniauth_crowd",3405.9749189815,0,18,0,7,22,0,1,23,2,"2",2,1.95652173913043 +"pdf-core",0.4904301487,3.0385774309,-0.1720936555,"https://salsa.debian.org/ruby-team/ruby-pdf-core","https://github.com/prawnpdf/pdf-core",3635.7233912037,6,16,0,15,46,0,0,47,2,"2",1.72727272727273,1.97872340425532 +"ruby-pgplot",-2.6363964332,-2.1680994385,-2.777770353,"https://salsa.debian.org/ruby-team/ruby-pgplot","https://github.com/masa16/ruby-pgplot",1430.3931597222,0,3,0,2,0,0,0,2,1,"1",2,1 +"pkg-config",0.3988956635,1.8385888168,-0.0542821557,"https://salsa.debian.org/ruby-team/ruby-pkg-config","https://github.com/ruby-gnome/pkg-config/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA +"powerpack",-0.1934084944,2.1339641007,-0.895456645,"https://salsa.debian.org/ruby-team/ruby-powerpack","https://github.com/bbatsov/powerpack.git",2684.7776041667,4,14,0,13,29,0,0,29,1,"1",1.77777777777778,2 +"premailer",-0.5173304375,2.1881663412,-1.1678917683,"https://salsa.debian.org/ruby-team/ruby-premailer","https://github.com/premailer/premailer",5001.0799884259,26,100,0,91,2,0,19,111,4,"4",1.79365079365079,1.01801801801802 +"ruby-progressbar",0.8495085041,3.8284313345,-0.1583697084,"https://salsa.debian.org/ruby-team/ruby-progressbar","https://github.com/jfelchner/ruby-progressbar/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA +"psych",0.1356905572,2.4813899471,-0.6287647557,"https://salsa.debian.org/ruby-team/ruby-psych","https://github.com/ruby/psych/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA +"puppet-syntax",-1.4274929514,0.597721473,-2.0050274993,"https://salsa.debian.org/ruby-team/ruby-puppet-syntax","https://github.com/voxpupuli/puppet-syntax/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA +"puppetlabs_spec_helper",-1.7074456885,0.8017468129,-2.3846811973,"https://salsa.debian.org/ruby-team/ruby-puppetlabs-spec-helper","https://github.com/puppetlabs/puppetlabs_spec_helper/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA +"rabl-rails",-0.911642608,0.5957511596,-1.2777176183,"https://salsa.debian.org/ruby-team/ruby-rabl-rails","https://github.com/ccocchi/rabl-rails/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA +"rack-google-analytics",-2.1861215386,0.6392727132,-2.9350136773,"https://salsa.debian.org/ruby-team/ruby-rack-google-analytics","https://github.com/kangguru/rack-google-analytics",1720.5543634259,2,20,0,17,54,0,0,56,1,"1",1.90909090909091,1.96428571428571 +"rack-oauth2",-0.4998111729,2.3524970457,-1.2089369245,"https://salsa.debian.org/ruby-team/ruby-rack-oauth2","https://github.com/nov/rack-oauth2/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA +"rack-test",0.1859803919,2.3863075108,-0.2515547357,"https://salsa.debian.org/ruby-team/ruby-rack-test","https://github.com/rack/rack-test/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA +"highlightjs",-1.776057653,0.676887867,-2.5692038823,"https://salsa.debian.org/ruby-team/ruby-rails-assets-highlightjs","https://github.com/components/highlightjs",2389.9739467593,1,13,0,13,40,0,0,41,1,"1",1.92857142857143,1.97560975609756 +"jquery.fullscreen",-0.3069663717,3.425973806,-1.5023904978,"https://salsa.debian.org/ruby-team/ruby-rails-assets-jquery-fullscreen-plugin","https://github.com/private-face/jquery.fullscreen",928.6241898148,0,10,3,5,39,0,0,39,1,"1",2,2 +"rails-deprecated_sanitizer",0.511323457,3.2709347629,-0.2232233125,"https://salsa.debian.org/ruby-team/ruby-rails-deprecated-sanitizer","https://github.com/rails/rails-deprecated_sanitizer/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA +"retryable",-0.6091419167,3.2470945934,-1.7468533882,"https://salsa.debian.org/ruby-team/ruby-retryable","https://github.com/nfedyashev/retryable/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA +"riddle",-0.2213568731,2.8190792528,-1.302253646,"https://salsa.debian.org/ruby-team/ruby-riddle","https://github.com/pat/riddle/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA +"riot",-2.0988502373,0.6683400663,-2.9186141778,"https://salsa.debian.org/ruby-team/ruby-riot","https://github.com/thumblemonks/riot.git",3321.7834953704,13,21,0,20,33,0,7,43,2,"2",1.61764705882353,1.76744186046512 +"rmagick",1.1027033423,3.178542172,0.1881853373,"https://salsa.debian.org/ruby-team/ruby-rmagick","https://github.com/rmagick/rmagick/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA +"roadie",-0.1961366614,1.239631746,-0.5682337388,"https://salsa.debian.org/ruby-team/ruby-roadie","https://github.com/Mange/roadie/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA +"roadie-rails",0.2474719144,3.1899002451,-0.5277315026,"https://salsa.debian.org/ruby-team/ruby-roadie-rails","https://github.com/Mange/roadie-rails/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA +"roxml",-2.5839472744,-1.4732125607,-2.7933760266,"https://salsa.debian.org/ruby-team/ruby-roxml","https://github.com/Empact/roxml/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA +"rr",-1.121241691,1.6540401602,-1.8988612605,"https://salsa.debian.org/ruby-team/ruby-rr","https://github.com/rr/rr/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA +"rspec-its",0.3171416756,3.0292623369,-0.3872674482,"https://salsa.debian.org/ruby-team/ruby-rspec-its","https://github.com/rspec/rspec-its/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA +"rspec-puppet",-1.5750551856,-0.1277944687,-2.1032613755,"https://salsa.debian.org/ruby-team/ruby-rspec-puppet","https://github.com/rodjek/rspec-puppet/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA +"rspec-rails",-1.5844038432,-0.1606831019,-1.9538760382,"https://salsa.debian.org/ruby-team/ruby-rspec-rails","https://github.com/rspec/rspec-rails/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA +"rspec-retry",-2.3142070783,-0.3616680713,-2.7725056817,"https://salsa.debian.org/ruby-team/ruby-rspec-retry","https://github.com/NoRedInk/rspec-retry/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA +"ruby2ruby",-1.2632583004,0.5122103892,-1.7609454819,"https://salsa.debian.org/ruby-team/ruby-ruby2ruby","https://github.com/seattlerb/ruby2ruby.git",5438.8588773148,0,3,0,3,34,0,0,35,4,"4",2,1.97142857142857 +"rmail",0.7637470574,3.3946799515,-0.0798110938,"https://salsa.debian.org/ruby-team/ruby-rubymail","https://github.com/terceiro/rmail/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA +"rufus-scheduler",-0.6929292609,1.2502062176,-1.0955436307,"https://salsa.debian.org/ruby-team/ruby-rufus-scheduler","https://github.com/jmettraux/rufus-scheduler/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA +"rugged",0.1738858881,1.9747468959,-0.302862283,"https://salsa.debian.org/ruby-team/ruby-rugged","https://github.com/libgit2/rugged/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA +"safe_yaml",0.4923372454,2.4380212188,-0.0762986291,"https://salsa.debian.org/ruby-team/ruby-safe-yaml","https://github.com/dtao/safe_yaml/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA +"ruby-saml",-0.6292373352,1.4888690533,-1.2152677939,"https://salsa.debian.org/ruby-team/ruby-saml","https://github.com/onelogin/ruby-saml/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA +"sanitize",0.1142111133,2.7598362726,-0.6767036115,"https://salsa.debian.org/ruby-team/ruby-sanitize","https://github.com/rgrove/sanitize/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA +"sassc-rails",-1.8895893476,0.6543031358,-2.5458693661,"https://salsa.debian.org/ruby-team/ruby-sassc-rails","https://github.com/sass/sassc-rails/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA +"sdoc",0.2066194576,2.5352625368,-0.2819990512,"https://salsa.debian.org/ruby-team/ruby-sdoc","https://github.com/zzak/sdoc.git",5126.572337963,22,57,0,56,0,0,0,56,4,"4",1.72151898734177,1 +"seamless_database_pool",-2.1643107675,0.2260298985,-2.6118947494,"https://salsa.debian.org/ruby-team/ruby-seamless-database-pool","https://github.com/bdurand/seamless_database_pool/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA +"selenium",-0.2089568629,1.5489405973,-0.5373754091,"https://salsa.debian.org/ruby-team/ruby-selenium-webdriver","https://github.com/SeleniumHQ/selenium/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA +"semantic_puppet",-0.6229814617,0.8563700058,-0.9765203623,"https://salsa.debian.org/puppet-team/ruby-semantic-puppet","https://github.com/puppetlabs/semantic_puppet/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA +"sequel_pg",0.6191087607,3.8061270046,-0.2981530837,"https://salsa.debian.org/ruby-team/ruby-sequel-pg","https://github.com/jeremyevans/sequel_pg.git",4773.6626388889,4,7,0,9,45,0,0,47,3,"3",1.63636363636364,1.95744680851064 +"sexp_processor",0.2542094629,3.0388178614,-0.4829633288,"https://salsa.debian.org/ruby-team/ruby-sexp-processor","https://github.com/seattlerb/sexp_processor",5341.4177430556,0,2,0,1,26,0,0,26,4,"4",2,2 +"ruby-shadow",0.216126739,1.4890131453,-0.1154816196,"https://salsa.debian.org/ruby-team/ruby-shadow","https://github.com/apalmblad/ruby-shadow/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA +"sham_rack",-2.1608189217,0.0182643744,-2.8608854622,"https://salsa.debian.org/ruby-team/ruby-sham-rack","https://github.com/mdub/sham_rack",3267.7854166667,2,5,0,3,12,0,0,12,2,"2",1.71428571428571,2 +"simplecov",-0.3160772042,2.2007214999,-1.0026344512,"https://salsa.debian.org/ruby-team/ruby-simplecov","https://github.com/simplecov-ruby/simplecov/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA +"slim",-0.3918087088,1.09130624,-0.8384953408,"https://salsa.debian.org/ruby-team/ruby-slim","http://github.com/slim-template/slim//issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA +"soap4r-noeticpenguin",0.4756744398,2.1003291699,-0.0796726268,"https://salsa.debian.org/ruby-team/ruby-soap4r","https://github.com/noeticpenguin/soap4r-noeticpenguin/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA +"spring",0.1889684319,2.2582459747,-0.2755388783,"https://salsa.debian.org/ruby-team/ruby-spring","https://github.com/rails/spring/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA +"sprockets-rails",0.6272839018,2.9396554619,-0.1070486043,"https://salsa.debian.org/ruby-team/ruby-sprockets-rails","https://github.com/rails/sprockets-rails/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA +"tins",-0.0184774495,2.3442756527,-0.4994282993,"https://salsa.debian.org/ruby-team/ruby-tins","https://github.com/flori/tins.git",5186.4477893519,2,5,0,6,19,0,0,19,4,"4",1.71428571428571,2 +"toml",0.5450450103,3.0277601672,-0.1659943286,"https://salsa.debian.org/ruby-team/ruby-toml","https://github.com/jm/toml",3202.4776736111,3,24,1,21,69,0,0,69,2,"2",1.88888888888889,2 +"treetop",0.2325856151,1.7246039787,-0.1675338127,"https://salsa.debian.org/ruby-team/ruby-treetop","https://github.com/cjheath/treetop/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA +"truncato",-0.892450421,1.0747849229,-1.3078720915,"https://salsa.debian.org/ruby-team/ruby-truncato","https://github.com/jorgemanrubia/truncato",3523.9293634259,2,13,0,10,27,0,0,28,2,"2",1.86666666666667,1.96428571428571 +"twitter",-0.6682623901,1.3259076585,-1.147074381,"https://salsa.debian.org/ruby-team/ruby-twitter","https://github.com/sferik/twitter",5668.765474537,66,150,0,172,52,0,171,383,4,"4",1.69444444444444,1.13577023498695 +"twitter-stream",-0.4992291188,2.3271486963,-1.2824567535,"https://salsa.debian.org/ruby-team/ruby-twitter-stream","http://github.com/voloko/twitter-stream/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA +"typed-array",-0.7061785139,1.6402446003,-1.1445021258,"https://salsa.debian.org/ruby-team/ruby-typed-array","https://github.com/yaauie/typed-array",63.5884953704,0,2,0,2,2,0,0,2,1,"1",2,2 +"typhoeus",-0.1128851981,2.3506320669,-0.7362615291,"https://salsa.debian.org/ruby-team/ruby-typhoeus","https://github.com/typhoeus/typhoeus/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA +"issues",-0.1835463152,-0.1043691104,-0.2043071695,"https://salsa.debian.org/ruby-team/ruby-tzinfo","https://tzinfo.github.io/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA +"url_safe_base64",-1.0899769047,2.7888654476,-2.2202803102,"https://salsa.debian.org/ruby-team/ruby-url-safe-base64","https://github.com/joenoon/url_safe_base64",1866.2862384259,0,2,0,2,2,0,0,2,1,"1",2,2 +"uuid",-0.141865508,3.1821978286,-1.059582524,"https://salsa.debian.org/ruby-team/ruby-uuid","https://github.com/assaf/uuid",4250.514537037,5,18,0,13,78,0,1,81,3,"3",1.78260869565217,1.96296296296296 +"uuidtools",0.0082132863,1.7860368385,-0.3798291083,"https://salsa.debian.org/ruby-team/ruby-uuidtools","https://github.com/sporkmonger/uuidtools",4302.5516087963,4,20,0,12,66,0,3,70,3,"3",1.83333333333333,1.94285714285714 +"validates_email",-1.5781922437,0.7480299974,-2.1834264358,"https://salsa.debian.org/ruby-team/ruby-validate-email","https://github.com/perfectline/validates_email.git",4596.2118865741,2,8,0,4,9,0,0,9,3,"3",1.8,2 +"validates_hostname",-1.2415295122,1.2211165969,-1.7510919236,"https://salsa.debian.org/ruby-team/ruby-validates-hostname","https://github.com/KimNorgaard/validates_hostname",4293.8459722222,0,12,0,5,18,0,0,18,3,"3",2,2 +"varia_model",-1.8678804974,-0.0930481582,-2.2356906543,"https://salsa.debian.org/ruby-team/ruby-varia-model","https://github.com/berkshelf/varia_model/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA +"version_sorter",-0.8955692286,1.3134248845,-1.3333811894,"https://salsa.debian.org/ruby-team/ruby-version-sorter","https://github.com/github/version_sorter",5346.8123032407,4,15,0,12,21,0,0,23,4,"4",1.78947368421053,1.91304347826087 +"versionomy",-1.9875633378,1.0365445382,-2.7207117207,"https://salsa.debian.org/ruby-team/ruby-versionomy","https://github.com/dazuma/versionomy/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA +"Voight-Kampff",-3.6122138418,-1.1841868732,-4.2747449932,"https://salsa.debian.org/ruby-team/ruby-voight-kampff","https://github.com/biola/Voight-Kampff/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA +"web-console",0.1404315345,2.5211217633,-0.3233556237,"https://salsa.debian.org/ruby-team/ruby-web-console","https://github.com/rails/web-console/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA +"webmock",-0.8722996031,1.4227793478,-1.5805653267,"https://salsa.debian.org/ruby-team/ruby-webmock","https://github.com/bblimke/webmock/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA +"websocket-ruby",-2.0302234955,1.0763961168,-2.8933706474,"https://salsa.debian.org/ruby-team/ruby-websocket","https://github.com/imanel/websocket-ruby.git",4172.1994328704,3,14,0,15,38,0,0,39,3,"3",1.82352941176471,1.97435897435897 +"xml-simple",0.2810527115,2.941255221,-0.5650827802,"https://salsa.debian.org/ruby-team/ruby-xml-simple","https://github.com/maik/xml-simple",3655.0192476852,4,12,0,12,31,0,0,31,2,"2",1.75,2 +"scalpel",1.9235574134,5.7889102705,0.6091390984,"https://salsa.debian.org/pkg-security-team/scalpel","https://github.com/sleuthkit/scalpel.git",2828.8538888889,1,11,0,5,69,0,0,69,2,"2",1.91666666666667,2 +"scanlogd",1.0265172022,3.3179170915,-0.0529925024,"https://salsa.debian.org/debian/scanlogd/","https://github.com/openwall/scanlogd.git",3573.3593287037,0,2,0,1,4,0,0,4,2,"2",2,2 +"scapy",0.8574558824,1.870596003,0.3040325575,"https://salsa.debian.org/pkg-security-team/scapy","https://github.com/secdev/scapy/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA +"maeparser",-0.1240254936,2.1383222642,-0.7555796895,"https://salsa.debian.org/debichem-team/schroedinger-maeparser","https://github.com/schrodinger/maeparser.git",2087.1343287037,12,14,0,15,15,0,0,16,1,"1",1.53846153846154,1.9375 +"science.js",-1.5791662472,1.653426766,-2.4733135985,"https://salsa.debian.org/js-team/science.js/","https://github.com/jasondavies/science.js.git",2725.1817592593,1,8,0,6,30,0,0,30,1,"1",1.88888888888889,2 +"scim",1.8800598007,2.6066941269,1.3618783859,"https://github.com/leggewie-DM/scim","https://github.com/leggewie-DM/scim",3009.7372800926,4,5,0,6,2,0,0,7,2,"2",1.55555555555556,1.28571428571429 +"scim-anthy",0.002293794,1.4287101867,-0.6578723431,"https://github.com/leggewie-DM/scim-anthy","https://github.com/leggewie-DM/scim-anthy",1414.2472685185,5,3,0,5,1,0,0,6,1,"1",1.375,1.16666666666667 +"scim-chewing",1.4542811691,3.3715479543,0.5061771978,"https://salsa.debian.org/debian/scim-chewing","https://github.com/chewing/scim-chewing.git",2973.6130092593,0,11,0,4,6,0,0,6,2,"2",2,2 +"scim-pinyin",1.3124715757,3.3775777533,0.2280732409,"https://salsa.debian.org/input-method-team/scim-pinyin","https://github.com/scim-im/scim-pinyin/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA +"scim-tables",0.9359530215,2.2487851526,0.2559891027,"https://github.com/leggewie-DM/scim-tables","https://github.com/leggewie-DM/scim-tables",793.6947685185,3,3,0,3,1,0,0,4,1,"1",1.5,1.25 +"sct-deb",0.114819976,2.8309553504,-0.5908234474,"https://github.com/Tookmund/sct-deb","https://github.com/Tookmund/sct-deb",125.8640393519,0,1,0,1,0,0,0,1,1,"1",2,1 +"setuptools_scm",0.0218119153,1.0762900197,-0.3060730181,"https://salsa.debian.org/python-team/packages/setuptools-scm","https://github.com/pypa/setuptools_scm/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA +"setuptools_scm_git_archive",-1.1288748526,1.4309706158,-1.7245251246,"https://salsa.debian.org/python-team/packages/setuptools-scm-git-archive","https://github.com/Changaco/setuptools_scm_git_archive",2852.8371759259,5,5,0,7,22,0,0,22,2,"2",1.5,2 +"sexplib",-1.5719893405,-0.308694773,-1.9907588838,"https://salsa.debian.org/ocaml-team/sexplib310","https://github.com/janestreet/sexplib.git",3950.7644444445,1,18,0,12,43,0,0,48,3,"3",1.94736842105263,1.89583333333333 +"sgabios-debian",0.6248433625,3.3447922772,-0.1006393146,"https://github.com/ymc/sgabios-debian","https://github.com/ymc/sgabios-debian",1409.8465509259,1,3,0,3,2,0,0,3,1,"1",1.75,1.66666666666667 +"shine",0.5449317214,2.5585883378,0.0206552894,"https://salsa.debian.org/multimedia-team/shine","https://github.com/savonet/shine/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA +"showq",0.4980241305,2.6384494868,-0.2994881583,"https://salsa.debian.org/multimedia-team/showq","https://github.com/evandelisle/showq.git",4589.6974189815,2,9,0,4,11,0,1,12,3,"3",1.81818181818182,1.91666666666667 +"shutdown-qapps",0.083229246,2.5754574312,-0.646790907,"https://github.com/hakaishi/shutdown-qapps","https://github.com/hakaishi/shutdown-qapps",4242.5183217593,1,5,0,2,4,0,0,4,3,"3",1.83333333333333,2 +"sidedoor",-1.2070083599,0.905385237,-1.6442775708,"https://github.com/daradib/sidedoor","https://github.com/daradib/sidedoor",1283.144525463,0,2,0,2,5,0,0,6,1,"1",2,1.83333333333333 +"siege",0.97547978,2.0335300671,0.3603230005,"https://salsa.debian.org/debian/siege","https://github.com/JoeDog/siege/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA +"sight",-2.4142300337,-1.1923515267,-2.6246960575,"https://salsa.debian.org/med-team/sight","https://github.com/IRCAD/sight",5195.7820833333,18,189,0,40,13,0,0,45,4,"4",1.91304347826087,1.28888888888889 +"signify",-0.42914773,1.9932487279,-0.9002655171,"https://salsa.debian.org/debian/signify-openbsd","https://github.com/aperezdc/signify.git",3467.3640972222,11,5,0,8,28,0,0,30,2,"2",1.3125,1.93333333333333 +"sigscheme",0.0095840913,0.5411815775,-0.1766561408,"https://salsa.debian.org/debian/sigscheme","https://github.com/uim/sigscheme.git",4570.4844212963,0,12,0,4,6,0,0,8,3,"3",2,1.75 +"silver-platter",-2.1237439075,-0.8804783102,-2.3543625093,"https://salsa.debian.org/jelmer/silver-platter","https://github.com/jelmer/silver-platter/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA +"timeline",0.4007687558,3.0154567789,-0.4849247131,"https://salsa.debian.org/js-team/simile-timeline","https://github.com/simile-widgets/timeline/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA +"simple-image-reducer",0.1736790136,2.6063762202,-0.6423729726,"https://salsa.debian.org/python-team/packages/simple-image-reducer","https://github.com/henrythasler/simple-image-reducer",3392.7195833333,3,5,0,5,11,0,0,11,2,"2",1.625,2 +"sklearn-pandas",-0.1846814273,2.4060352331,-0.9752323305,"https://salsa.debian.org/debian/sklearn-pandas","https://github.com/scikit-learn-contrib/sklearn-pandas/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA +"SkyPat",-3.6622190091,-1.2552465603,-4.2901929758,"https://salsa.debian.org/debian/skypat","https://github.com/skymizer/SkyPat",1330.0854513889,4,12,0,7,15,0,1,18,1,"1",1.75,1.83333333333333 +"slick-greeter",0.230041088,2.4883516609,-0.403804259,"https://github.com/UbuntuBudgie/slick-greeter/tree/debian","https://github.com/UbuntuBudgie/slick-greeter",2438.3149768519,27,9,0,9,3,0,0,10,1,"1",1.25,1.3 +"smarty-gettext",-0.1172764021,0.9213265959,-0.4308872423,"https://salsa.debian.org/debian/smarty-gettext/","https://github.com/smarty-gettext/smarty-gettext.git",3367.1055439815,3,7,0,6,31,0,0,31,2,"2",1.7,2 +"smarty-lexer",-2.1771173058,0.8224220515,-2.9339605005,"https://salsa.debian.org/debian/smarty-lexer/","https://github.com/smarty-php/smarty-lexer.git",2967.1062731482,1,5,0,2,3,0,0,4,2,"2",1.83333333333333,1.75 +"smash",-1.6021448383,1.016931715,-2.2070553084,"https://salsa.debian.org/js-team/smash","https://github.com/mbostock/smash.git",1268.6711921296,0,6,0,5,23,0,4,27,1,"1",2,1.85185185185185 +"smbldap-tools",4.0992169923,6.2973766162,2.977896731,"https://salsa.debian.org/debian/smbldap-tools","https://github.com/fumiyas/smbldap-tools",3527.4513194445,0,4,0,1,2,0,0,3,2,"2",2,1.66666666666667 +"snake4.debian",0.095148698,1.3696917472,-0.4120560031,"https://github.com/alexdantas/snake4.debian","https://github.com/alexdantas/snake4.debian",10.4776388889,5,4,0,0,2,0,0,2,1,"1",1.44444444444444,2 +"sndfile-tools",0.7443837151,2.9271900432,0.0039892841,"https://salsa.debian.org/multimedia-team/sndfile-tools","https://github.com/libsndfile/sndfile-tools.git",5283.239212963,10,6,0,14,26,0,0,26,4,"4",1.375,2 +"debian-snetz",-0.1935171339,3.2904821975,-1.2264363982,"https://github.com/paniagua-gustavo/debian-snetz","https://github.com/paniagua-gustavo/debian-snetz",0.188125,0,2,0,1,0,0,0,1,1,"1",2,1 +"sord",0.6196290047,2.4503028479,0.0661140316,"https://salsa.debian.org/multimedia-team/sord","https://github.com/drobilla/sord.git",4651.0402893519,0,1,0,1,9,0,0,9,3,"3",2,2 +"python-sortedcollections",0.0282138035,2.5630571401,-0.4563520078,"https://salsa.debian.org/python-team/packages/sortedcollections","https://github.com/grantjenks/python-sortedcollections",2101.4924884259,2,4,0,4,19,0,0,19,1,"1",1.66666666666667,2 +"sosi2osm",-0.0665032677,2.7414888103,-0.7399578074,"https://salsa.debian.org/debian-gis-team/sosi2osm","https://github.com/Gnonthgol/sosi2osm.git",3689.8328125,3,10,0,6,9,0,0,11,2,"2",1.76923076923077,1.81818181818182 +"soundconverter",0.4540740816,1.0143004971,0.117664665,"https://salsa.debian.org/multimedia-team/soundconverter","https://github.com/kassoulet/soundconverter/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA +"spacefm",0.0215364285,0.7019135888,-0.2802976133,"https://github.com/mati75/spacefm.git","https://github.com/mati75/spacefm.git",3876.4630671296,0,4,0,2,1,0,0,2,3,"3",2,1.5 +"SparkleShare",0.9167518699,2.534959747,0.0535700536,"https://salsa.debian.org/debian/sparkleshare","https://github.com/hbons/SparkleShare",4856.867974537,90,134,3,141,8,0,73,221,3,"3",1.59821428571429,1.03619909502262 +"speechd-up",-1.2789607706,1.2929705527,-2.0775310838,"https://salsa.debian.org/a11y-team/speechd-up","https://github.com/williamh/speechd-up.git",1059.3273726852,1,4,0,2,3,0,0,5,1,"1",1.8,1.6 +"speedpad-debian",-0.3911902301,0.972185266,-0.6939336088,"https://github.com/ltworf/speedpad-debian","https://github.com/ltworf/speedpad-debian",829.1033101852,0,2,0,1,0,0,0,1,1,"1",2,1 +"sphinx-argparse",-0.7549373494,1.0088944933,-1.2169968655,"https://salsa.debian.org/python-team/packages/sphinx-argparse","https://github.com/ribozz/sphinx-argparse",2938.5171412037,2,31,0,22,35,0,0,46,2,"2",1.93939393939394,1.76086956521739 +"sphinx-astropy",-1.4271235012,-0.7867770371,-1.5421845699,"https://salsa.debian.org/debian-astro-team/sphinx-astropy","https://github.com/astropy/sphinx-astropy",4334.9151736111,3,25,1,17,25,0,1,31,3,"3",1.89285714285714,1.80645161290323 +"sphinx-autorun",-1.0917758526,1.7268550032,-1.8045400627,"https://salsa.debian.org/python-team/packages/sphinx-autorun","https://github.com/hobarrera/sphinx-autorun",4960.1845949074,3,8,0,6,17,0,0,20,3,"3",1.72727272727273,1.85 +"sphinx_celery",-1.2937827686,0.4938075079,-1.9951471611,"https://salsa.debian.org/python-team/packages/sphinx-celery","https://github.com/celery/sphinx_celery",2803.725,12,7,1,15,21,0,0,21,2,"2",1.36842105263158,2 +"sphinx-paramlinks",-1.1682253235,0.3868734443,-1.5684932781,"https://salsa.debian.org/python-team/packages/sphinx-paramlinks","https://github.com/sqlalchemyorg/sphinx-paramlinks",3511.5527777778,5,5,0,7,18,0,0,19,2,"2",1.5,1.94736842105263 +"autoprogram",-1.4560452615,-0.2596772946,-1.6612142206,"https://salsa.debian.org/python-team/packages/sphinxcontrib-autoprogram","https://github.com/sphinx-contrib/autoprogram.git",3291.9937962963,8,16,0,20,46,0,0,53,2,"2",1.66666666666667,1.86792452830189 +"sratom",0.5401649761,2.8512138953,0.0136305168,"https://salsa.debian.org/multimedia-team/sratom","https://github.com/lv2/sratom.git",4263.558912037,3,1,0,4,5,0,0,6,3,"3",1.25,1.83333333333333 +"python-sshpubkeys",-1.9121140748,-0.1894818509,-2.3312629201,"https://salsa.debian.org/python-team/packages/sshpubkeys","https://github.com/ojarva/python-sshpubkeys.git",3267.3521759259,3,17,0,14,29,0,0,36,2,"2",1.85,1.80555555555556 +"sslsniff",0.7229167902,2.7591250777,-0.184867548,"https://salsa.debian.org/pkg-security-team/sslsniff","https://github.com/moxie0/sslsniff.git",177.084849537,0,2,0,1,0,0,1,2,1,"1",2,1 +"st",-1.7905650767,0.6769505545,-2.3325670973,"https://salsa.debian.org/debian/st-console","https://github.com/nferraz/st",3551.6255439815,0,6,0,4,35,0,0,36,2,"2",2,1.97222222222222 +"starfighter",1.1315056363,2.4483606179,0.4071420536,"https://salsa.debian.org/fmneto-guest/starfighter","https://github.com/pr-starfighter/starfighter",4492.0575231482,7,18,0,11,15,0,0,17,3,"3",1.72,1.88235294117647 +"starjava",-0.5484854258,1.0238215507,-0.8398906165,"https://salsa.debian.org/debian-astro-team/starjava-topcat","https://github.com/Starlink/starjava/issues/new",2746.3319791667,2,17,0,0,0,0,0,29,2,"2",1.89473684210526,1 +"starjava",-0.6975561907,0.0612089874,-0.8309402362,"https://salsa.debian.org/debian-astro-team/starjava-ttools","https://github.com/Starlink/starjava/issues/new",2746.3319791667,2,17,0,0,0,0,0,29,2,"2",1.89473684210526,1 +"starjava",-0.5724217622,0.5167921554,-0.7890780686,"https://salsa.debian.org/debian-astro-team/starjava-util","https://github.com/Starlink/starjava",5785.0740046296,2,26,0,10,26,0,0,29,4,"4",1.92857142857143,1.89655172413793 +"Starman",-0.4167370479,0.4887372311,-0.5755472783,"https://salsa.debian.org/perl-team/modules/packages/starman","https://github.com/miyagawa/Starman/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA +"staticsite",-0.4550445168,2.6259534139,-1.4004015176,"https://salsa.debian.org/enrico/staticsite","https://github.com/spanezz/staticsite",2745.0971527778,0,7,1,5,10,0,0,11,1,"1",2,1.90909090909091 +"stex",-4.0668315454,-2.4954928101,-4.3496245401,"https://salsa.debian.org/debian/stex","https://github.com/dybvig/stex",1828.8861226852,1,7,0,3,5,0,0,6,1,"1",1.875,1.83333333333333 +"stlink",0.2330578642,3.0498837848,-0.4676802192,"https://github.com/bluca/stlink","https://github.com/bluca/stlink",4380.0284722222,78,192,0,121,3,0,0,124,3,"3",1.71111111111111,1.0241935483871 +"stress",0.7791794941,3.5368026661,-0.027963401,"https://salsa.debian.org/debian/stress","https://github.com/resurrecting-open-source-projects/stress",489.8052893519,0,3,0,2,7,0,0,7,1,"1",2,2 +"subdownloader",0.2576738138,1.416208065,-0.2677955961,"https://salsa.debian.org/python-team/packages/subdownloader","https://github.com/subdownloader/subdownloader",4731.6769560185,4,22,3,10,23,0,0,27,3,"3",1.84615384615385,1.85185185185185 +"subtitleeditor",0.4715189003,1.2173077891,0.045958129,"https://salsa.debian.org/debian/subtitleeditor","https://github.com/kitone/subtitleeditor",5679.7465856482,2,6,0,6,54,0,1,55,4,"4",1.75,1.98181818181818 +"pkg-subtle",-0.1057456347,2.6291844345,-1.1261393388,"http://github.com/formorer/pkg-subtle","http://github.com/formorer/pkg-subtle",305.3167708333,0,1,0,0,0,0,0,0,1,"1",2,NA +"subvertpy",-0.0856463379,0.9174986859,-0.5281506467,"https://salsa.debian.org/python-team/packages/subvertpy","https://github.com/jelmer/subvertpy",3827.0174421296,14,36,0,29,16,0,0,41,3,"3",1.72,1.39024390243902 +"suil",0.6666244731,2.9498824035,0.0198598554,"https://salsa.debian.org/multimedia-team/suil","https://github.com/lv2/suil.git",4625.665625,6,1,0,7,14,0,0,15,3,"3",1.14285714285714,1.93333333333333 +"sway",-0.0003144281,1.8211497146,-0.4602739815,"https://salsa.debian.org/swaywm-team/sway","https://github.com/swaywm/sway/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA +"lv2",0.0271485834,2.3196893623,-0.405826923,"https://salsa.debian.org/multimedia-team/swh-lv2","https://github.com/swh/lv2",4769.9272800926,1,14,0,7,17,0,1,19,3,"3",1.93333333333333,1.89473684210526 +"ladspa",0.7083949622,1.4520571608,0.2842081476,"https://salsa.debian.org/multimedia-team/swh-plugins","https://github.com/swh/ladspa.git",5572.5839930556,1,25,0,15,58,0,0,58,4,"4",1.96153846153846,2 +"swift-bench",-3.6971618893,-0.9738891515,-4.3114902928,"https://salsa.debian.org/openstack-team/services/swift-bench","https://github.com/openstack/swift-bench.git",4746.0268287037,8,47,0,37,2,0,0,39,3,"3",1.85454545454545,1.05128205128205 +"swupdate",-4.1380420208,-0.3765046535,-5.2410349606,"https://salsa.debian.org/debian/swupdate","https://github.com/sbabic/swupdate",3657.1083217593,179,6,0,128,0,0,1,129,2,"2",1.03243243243243,1 +"sxid",0.3383169662,2.494076504,-0.6427792124,"https://salsa.debian.org/debian/sxid","https://github.com/taem/sxid",1429.0293865741,0,1,0,1,2,0,0,3,1,"1",2,1.66666666666667 +"synthv1",0.0241434868,1.3740935149,-0.399365925,"https://salsa.debian.org/multimedia-team/synthv1","https://github.com/rncbc/synthv1.git",4117.1360763889,0,14,0,3,15,0,0,15,3,"3",2,2 +"syrep",-0.3840410127,1.5663799383,-1.1500496799,"https://github.com/JonathonReinhart/syrep","https://github.com/JonathonReinhart/syrep",0.0023611111,1,1,0,1,2,0,0,3,1,"1",1.5,1.66666666666667 +"sysfsutils",1.4604939319,2.5043938068,0.8202891312,"https://git.hadrons.org/cgit/debian/pkgs/sysfsutils.git","https://github.com/linux-ras/sysfsutils/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA +"syslog-ng-debian",0.3360880552,0.5117634173,0.1859714072,"https://github.com/gcsideal/syslog-ng-debian","https://github.com/gcsideal/syslog-ng-debian",4178.4473842593,0,12,0,6,7,0,0,8,3,"3",2,1.875 +"ocaml-syslog",-0.9966573409,1.2541731317,-1.7322570063,"https://salsa.debian.org/ocaml-team/syslog-ocaml","https://github.com/geneanet/ocaml-syslog.git",690.8139351852,1,3,0,2,3,0,0,3,1,"1",1.75,2 +"system-config-printer",2.3553472865,3.3297611296,1.7170434503,"https://salsa.debian.org/gnome-team/system-config-printer","https://github.com/OpenPrinting/system-config-printer/commits/master",5185.326875,55,11,0,0,0,0,0,0,4,"4",1.16666666666667,NA +"systemd-bootchart",0.0589352376,2.4948219717,-0.5217369948,"https://salsa.debian.org/systemd-team/systemd-bootchart","https://github.com/systemd/systemd-bootchart",2813.8079282408,13,11,0,15,41,0,0,41,2,"2",1.45833333333333,2 +"systemd-cron",0.2435713073,1.0673184216,-0.1917909328,"https://salsa.debian.org/systemd-team/systemd-cron","https://github.com/systemd-cron/systemd-cron.git",3852.6322916667,2,17,0,15,36,0,0,42,3,"3",1.89473684210526,1.85714285714286 +"systemfixtures",-2.6293231508,-0.9364247044,-3.0058243691,"https://salsa.debian.org/python-team/modules/systemfixtures","https://github.com/testing-cabal/systemfixtures.git",2181.1332638889,4,4,0,5,9,0,0,9,1,"1",1.5,2 +"systray-mdstat",-0.4934338937,2.3728697502,-1.2391690443,"https://github.com/xtaran/systray-mdstat","https://github.com/xtaran/systray-mdstat",1731.2023611111,1,1,0,2,1,0,0,2,1,"1",1.5,1.5 +"systune",-0.2655422679,0.9388013102,-0.7018488457,"https://github.com/sudipm-mukherjee/systune.git","https://github.com/sudipm-mukherjee/systune.git",176.0601736111,1,4,0,2,3,0,0,3,1,"1",1.8,2 +"sysvinit",1.5203549982,1.687243769,1.3661977311,"https://salsa.debian.org/debian/sysvinit","https://github.com/slicer69/sysvinit",5198.3006944445,2,8,0,4,17,0,0,19,4,"4",1.8,1.89473684210526 +"PEGTL",-2.2004802085,0.2251806172,-2.7633878882,"https://salsa.debian.org/birger/tao-pegtl","https://github.com/taocpp/PEGTL/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA +"tap-plugins",0.09238064,1.3104592411,-0.1802167379,"https://salsa.debian.org/multimedia-team/tap-plugins","https://github.com/tomszilagyi/tap-plugins.git",5078.9168287037,3,8,0,0,2,0,0,2,4,"4",1.72727272727273,2 +"tclsignal",0.119740533,2.2371868408,-0.3075114676,"https://salsa.debian.org/tcltk-team/tcl-signal","https://github.com/wjoye/tclsignal",2449.858275463,1,4,0,3,4,0,0,4,1,"1",1.8,2 +"terminaltables",0.4124929606,3.3980129071,-0.3182990743,"https://git.progress-linux.org/users/daniel.baumann/debian/packages/terminaltables","https://github.com/matthewdeanmartin/terminaltables",2707.668125,1,11,0,9,4,0,0,12,1,"1",1.91666666666667,1.33333333333333 +"termrec",-0.546232522,1.7238998812,-0.9959233042,"https://github.com/kilobyte/termrec/tree/debian","https://github.com/kilobyte/termrec",5312.9533564815,0,2,0,1,8,0,0,8,4,"4",2,2 +"tesseract-lang-debian",0.323928139,1.2279995331,-0.0238272916,"https://github.com/AlexanderP/tesseract-lang-debian","https://github.com/AlexanderP/tesseract-lang-debian",1566.6614814815,0,5,0,3,2,0,0,3,1,"1",2,1.66666666666667 +"test-kitchen",-0.9210414384,1.3276246051,-1.6015563224,"https://salsa.debian.org/ruby-team/test-kitchen","https://github.com/test-kitchen/test-kitchen/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA +"testpath",0.178377175,1.4251577183,-0.1467982799,"https://salsa.debian.org/python-team/packages/testpath","https://github.com/jupyter/testpath.git",2578.9209490741,1,9,0,7,23,0,0,23,1,"1",1.9,2 +"brev-cls",-0.9042148426,0.8986607838,-1.4914577347,"https://salsa.debian.org/debian/tetex-brev","https://github.com/asgeirn/brev-cls.git",3127.5767708333,2,4,0,3,3,0,0,3,2,"2",1.66666666666667,2 +"tex-common",0.1512318896,0.2576765609,0.0745875585,"https://github.com/debian-tex/tex-common","https://github.com/debian-tex/tex-common",5410.6258333333,2,8,0,3,1,0,0,3,4,"4",1.8,1.33333333333333 +"tex-gyre",1.3108709384,3.2134416841,0.4567270817,"https://github.com/debian-tex/tex-gyre","https://github.com/debian-tex/tex-gyre",5218.6495833333,2,7,0,3,2,0,0,3,4,"4",1.77777777777778,1.66666666666667 +"texext",-0.4966012771,2.4692944946,-1.3814646844,"https://salsa.debian.org/python-team/packages/texext","https://github.com/matthew-brett/texext.git",2951.8081134259,0,5,0,4,11,0,0,11,2,"2",2,2 +"texinfo",1.2380835186,1.5944121073,0.9657638025,"https://github.com/debian-tex/texinfo","https://github.com/debian-tex/texinfo",5779.8813425926,3,9,0,5,6,0,0,6,4,"4",1.75,2 +"texlive-nonbin",1.1567962942,1.3629616108,0.9821522688,"https://github.com/debian-tex/texlive-nonbin/tree/master/texlive-base","https://github.com/debian-tex/texlive-nonbin",4319.3633101852,4,9,0,6,2,0,0,6,3,"3",1.69230769230769,1.33333333333333 +"texlive-bin",0.977654239,1.2601203851,0.7506196709,"https://github.com/debian-tex/texlive-bin","https://github.com/debian-tex/texlive-bin",4308.437662037,3,11,0,5,3,0,0,5,3,"3",1.78571428571429,1.6 +"texlive-nonbin",0.8703298986,1.0658084365,0.7081177712,"https://github.com/debian-tex/texlive-nonbin/tree/master/texlive-extra","https://github.com/debian-tex/texlive-nonbin",4319.3633101852,4,9,0,6,2,0,0,6,3,"3",1.69230769230769,1.33333333333333 +"texlive-nonbin",0.7296144256,1.0788261732,0.4593754059,"https://github.com/debian-tex/texlive-nonbin/tree/master/texlive-lang","https://github.com/debian-tex/texlive-nonbin",4319.3633101852,4,9,0,6,2,0,0,6,3,"3",1.69230769230769,1.33333333333333 +"texworks",0.3457955776,1.3076412249,-0.0653044306,"https://github.com/debian-tex/texworks","https://github.com/debian-tex/texworks",4991.6789583333,1,9,0,5,2,0,0,5,4,"4",1.9,1.4 +"texworks-manual",0.1987398847,2.5940035152,-0.3212280071,"https://github.com/debian-tex/texworks-manual","https://github.com/debian-tex/texworks-manual",1933.1899652778,2,5,0,3,1,0,0,3,1,"1",1.71428571428571,1.33333333333333 +"thaixfonts",0.1281624612,0.8719218593,-0.2256916476,"https://salsa.debian.org/debian/thaixfonts","https://github.com/tlwg/thaixfonts/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA +"three.js",0.1158900848,1.6807050834,-0.3114096336,"https://salsa.debian.org/js-team/three.js","https://github.com/mrdoob/three.js/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA +"thunar-dropbox",0.1154555368,2.1832206667,-0.4180527247,"https://salsa.debian.org/xfce-extras-team/thunar-dropbox-plugin","https://github.com/jeinzi/thunar-dropbox.git",3052.1741319445,2,6,0,4,6,0,0,9,2,"2",1.75,1.66666666666667 +"timbl",-0.4012992985,1.3917222421,-0.9206654469,"https://salsa.debian.org/science-team/timbl","https://github.com/LanguageMachines/timbl.git",2913.2087384259,0,8,0,2,8,0,0,8,2,"2",2,2 +"tinyssh",-1.473292065,0.8649169728,-1.916526544,"https://salsa.debian.org/debian/tinyssh","https://github.com/janmojzis/tinyssh.git",3264.9232175926,1,18,0,10,66,0,0,67,2,"2",1.94736842105263,1.98507462686567 +"tp_smapi",0.8443233686,2.0576796454,0.2538706265,"https://salsa.debian.org/debian/tp-smapi","https://github.com/linux-thinkpad/tp_smapi",4476.6966550926,6,7,0,5,90,0,2,92,3,"3",1.53846153846154,1.97826086956522 +"tpm2-initramfs-tool",-1.4035912508,1.8041112115,-2.1934256167,"https://github.com/timchen119/tpm2-initramfs-tool","https://github.com/timchen119/tpm2-initramfs-tool",486.0112962963,0,2,0,0,6,0,0,6,1,"1",2,2 +"trace-cmd",0.0998974637,1.3978799562,-0.3546480844,"https://github.com/sudipm-mukherjee/trace-cmd.git","https://github.com/sudipm-mukherjee/trace-cmd.git",1314.92875,139,17,0,90,1,0,0,90,1,"1",1.10897435897436,1.01111111111111 +"trackballs",0.2450481241,1.0347559155,-0.1842061844,"https://salsa.debian.org/games-team/trackballs","https://github.com/trackballs/trackballs.git",2063.1770717593,6,7,0,7,20,0,0,20,1,"1",1.53846153846154,2 +"tran",-0.5507488829,1.9378847892,-1.0913812007,"https://github.com/kilobyte/tran/tree/debian","https://github.com/kilobyte/tran",4999.4501736111,0,1,0,1,3,0,0,3,4,"4",2,2 +"trayer-srg",0.7960935453,2.2360852153,0.1224095274,"https://salsa.debian.org/skangas/trayer","https://github.com/sargon/trayer-srg/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA +"triangle",-0.1711886516,3.1308185907,-1.215472085,"https://salsa.debian.org/science-team/triangle","https://github.com/libigl/triangle.git",2528.1501736111,2,7,0,5,8,0,0,8,1,"1",1.77777777777778,2 +"triggerhappy",1.5982884158,4.4832077788,0.3890624079,"https://github.com/wertarbyte/triggerhappy","https://github.com/wertarbyte/triggerhappy",2171.0642708333,5,5,0,7,41,0,0,44,1,"1",1.5,1.93181818181818 +"Trimage",1.2553852758,3.9585208411,0.1886888721,"https://salsa.debian.org/debian-phototools-team/trimage","https://github.com/Kilian/Trimage",4077.9117708333,2,17,0,9,64,0,0,66,3,"3",1.89473684210526,1.96969696969697 +"trinityrnaseq",-0.3652446175,1.4159966432,-0.9745313296,"https://salsa.debian.org/med-team/trinityrnaseq","https://github.com/trinityrnaseq/trinityrnaseq/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA +"trivial-features",0.2637949915,3.2767480587,-0.566814757,"https://salsa.debian.org/common-lisp-team/trivial-features","https://github.com/trivial-features/trivial-features",5548.6738657407,11,9,0,15,24,0,0,24,4,"4",1.45,2 +"trivial-gray-streams",-0.0499196075,1.9477808571,-0.5052595662,"https://salsa.debian.org/common-lisp-team/trivial-gray-streams","https://github.com/trivial-gray-streams/trivial-gray-streams/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA +"trocla",-1.1282943752,1.854915092,-2.1296966635,"https://salsa.debian.org/ruby-team/trocla","https://github.com/duritong/trocla",4222.9344444445,2,25,0,16,33,0,0,34,3,"3",1.92592592592593,1.97058823529412 +"trollsift",-2.0282713827,0.319975344,-2.4783042686,"https://salsa.debian.org/debian-gis-team/trollsift","https://github.com/pytroll/trollsift",3470.9592824074,4,15,0,12,21,0,0,22,2,"2",1.78947368421053,1.95454545454545 +"tslib-debian",0.1336789289,0.9994750001,-0.093473923,"https://github.com/merge/tslib-debian","https://github.com/merge/tslib-debian",1295.9506018519,2,3,0,1,1,0,0,1,1,"1",1.6,2 +"tty-clock",-0.284505417,0.4575702587,-0.4967187932,"https://github.com/anarcat/tty-clock/tree/debian","https://github.com/anarcat/tty-clock",3142.1821759259,0,24,0,13,1,0,0,14,2,"2",2,1.07142857142857 +"tweepy",0.3014929332,2.3332026362,-0.5274701476,"https://salsa.debian.org/python-team/packages/tweepy","https://github.com/tweepy/tweepy.git",5164.9313194445,72,189,0,197,21,0,0,215,4,"4",1.72413793103448,1.09767441860465 +"Twiggy",0.3100508018,4.0880000737,-0.8527826044,"https://salsa.debian.org/perl-team/modules/packages/twiggy","https://github.com/miyagawa/Twiggy/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA +"twms",-0.5922081551,1.2383570594,-1.1972199961,"https://salsa.debian.org/debian/twms","https://github.com/Komzpa/twms.git",2177.2821875,3,11,0,4,5,0,0,5,1,"1",1.78571428571429,2 +"uhub-debian",-0.2796838226,3.5742395891,-1.580799445,"https://github.com/tehnick/uhub-debian","https://github.com/tehnick/uhub-debian",4037.2023148148,0,1,0,1,1,0,0,2,3,"3",2,1.5 +"uim-chewing",-2.5213043929,-0.416096965,-2.9868668,"https://salsa.debian.org/debian/uim-chewing","https://github.com/uim/uim-chewing",1095.7200231482,0,1,0,0,0,0,0,0,1,"1",2,NA +"ukui-biometric-auth",-1.2310843043,0.7537049181,-1.6740612047,"https://github.com/ukui/ukui-biometric-auth","https://github.com/ukui/ukui-biometric-auth",1260.5815625,5,11,0,8,6,0,0,10,1,"1",1.6875,1.6 +"ukui-control-center",-2.2036628317,0.0511944606,-2.8931977038,"https://github.com/ukui/ukui-control-center","https://github.com/ukui/ukui-control-center",1921.8410069445,76,81,0,41,13,0,0,52,1,"1",1.51592356687898,1.25 +"ukui-indicators",-1.377804594,1.2157849638,-2.1158896015,"https://github.com/ukui/ukui-indicators","https://github.com/ukui/ukui-indicators",1239.8214814815,3,9,0,5,4,0,0,5,1,"1",1.75,1.8 +"ukui-power-manager",-0.3190978856,2.9128539736,-1.1219811752,"https://github.com/ukui/ukui-power-manager","https://github.com/ukui/ukui-power-manager",1544.224537037,3,19,0,9,9,0,0,14,1,"1",1.86363636363636,1.64285714285714 +"ukui-settings-daemon",0.1219875774,3.2976507371,-0.6818364877,"https://github.com/ukui/ukui-settings-daemon","https://github.com/ukui/ukui-settings-daemon",1595.2230439815,10,31,0,10,21,0,0,26,1,"1",1.75609756097561,1.80769230769231 +"ukui-themes",-0.5826962952,2.2384569095,-1.2986461297,"https://github.com/ukui/ukui-themes","https://github.com/ukui/ukui-themes",1509.1822916667,6,9,0,8,12,0,0,13,1,"1",1.6,1.92307692307692 +"umoci",-1.5049797774,0.5808986769,-2.0306653344,"https://salsa.debian.org/go-team/packages/umoci","https://github.com/opencontainers/umoci/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA +"unburden-home-dir",-0.501169023,0.195057165,-0.7613384703,"https://github.com/xtaran/unburden-home-dir","https://github.com/xtaran/unburden-home-dir",4201.5461342593,1,10,2,6,17,0,0,17,3,"3",1.90909090909091,2 +"underscore",0.5577202877,2.1670034109,0.0619794849,"https://salsa.debian.org/js-team/underscore","https://github.com/jashkenas/underscore.git",5084.8093171296,25,336,0,261,27,0,52,334,4,"4",1.93074792243767,1.08083832335329 +"Unhide",1.7061388819,3.8742874975,0.7376306506,"https://salsa.debian.org/pkg-security-team/unhide","https://github.com/YJesus/Unhide.git",991.7221296296,2,5,0,5,6,0,0,8,1,"1",1.71428571428571,1.75 +"unorm",-1.3130104406,0.8981282809,-1.8444156842,"https://salsa.debian.org/js-team/unorm.js","https://github.com/walling/unorm/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA +"unrar-nonfree",1.8473265605,3.1989063054,1.0595588445,"https://github.com/debian-calibre/unrar-nonfree","https://github.com/debian-calibre/unrar-nonfree",1876.6905902778,7,5,0,5,3,0,0,5,1,"1",1.41666666666667,1.6 +"unrardll",-0.7960021888,0.5888362105,-1.105938125,"https://github.com/debian-calibre/unrardll","https://github.com/debian-calibre/unrardll",1864.0022916667,0,4,0,3,1,0,0,3,1,"1",2,1.33333333333333 +"vagalume",-1.4511274237,-0.9732880608,-1.5424132302,"https://salsa.debian.org/berto/vagalume","https://github.com/bertogg/vagalume",2090.3450578704,26,3,0,19,0,0,0,19,1,"1",1.10344827586207,1 +"vagrant",0.2299619618,0.6284669987,0.0013114431,"https://salsa.debian.org/ruby-team/vagrant","https://github.com/hashicorp/vagrant/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA +"valabind",-1.2435397352,-0.3428907439,-1.6087950787,"https://salsa.debian.org/debian/valabind","https://github.com/radare/valabind",4839.9819560185,6,19,0,15,41,0,0,42,3,"3",1.76,1.97619047619048 +"valinor",-2.9368505692,-1.1020102649,-3.3193721608,"https://salsa.debian.org/python-team/packages/valinor","https://github.com/ARMmbed/valinor.git",1839.1786805556,3,12,0,9,17,0,0,17,1,"1",1.8,2 +"variantslib",-2.0986968646,0.447590858,-2.6103147834,"https://salsa.debian.org/ocaml-team/variantslib","https://github.com/janestreet/variantslib.git",3865.5561921296,0,7,0,5,3,0,0,8,3,"3",2,1.375 +"vcversioner",0.242716431,2.8314661474,-0.3332608567,"https://salsa.debian.org/python-team/packages/vcversioner","https://github.com/habnabit/vcversioner",1010.4509143519,0,4,0,2,18,0,0,18,1,"1",2,2 +"vfu-deb",0.7502192139,2.4194817119,-0.0549697238,"https://github.com/bbonev/vfu-deb","https://github.com/bbonev/vfu-deb",1063.877025463,0,1,0,1,0,0,0,1,1,"1",2,1 +"vim-autopep8",0.2098655728,3.1531229671,-0.5592658877,"https://salsa.debian.org/python-team/packages/vim-autopep8","https://github.com/tell-k/vim-autopep8.git",1821.7416782407,1,10,0,7,52,0,0,52,1,"1",1.90909090909091,2 +"command-t",-0.281217187,1.711936341,-0.8034960415,"https://github.com/yrro/command-t","https://github.com/yrro/command-t",4589.5430092593,66,14,0,60,1,0,0,61,3,"3",1.175,1.01639344262295 +"volumeicon-debian",0.5582239179,2.4117054016,-0.1176545428,"https://github.com/mati75/volumeicon-debian.git","https://github.com/mati75/volumeicon-debian.git",4377.0106597222,0,5,0,3,1,0,0,3,3,"3",2,1.33333333333333 +"csg",-1.3015984703,-0.1291946736,-1.7236921975,"https://salsa.debian.org/debichem-team/votca-csg","https://github.com/votca/csg/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA +"vowpal_wabbit",1.6051587851,4.7879705553,0.3258945817,"http://github.com/yarikoptic/vowpal_wabbit","http://github.com/yarikoptic/vowpal_wabbit",3692.4062037037,66,280,0,0,0,0,0,0,2,"2",1.80924855491329,NA +"vows",-1.3939497745,0.3324247114,-1.7950844541,"https://salsa.debian.org/js-team/vows","https://github.com/cloudhead/vows/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA +"vpcs",0.5719602774,3.99052142,-0.2987031963,"https://github.com/dlintott/vpcs","https://github.com/dlintott/vpcs",302.5271875,0,2,0,2,1,0,0,2,1,"1",2,1.5 +"vpnc",0.7552132496,1.2426452707,0.4176316467,"https://salsa.debian.org/debian/vpnc","https://github.com/streambinder/vpnc",5629.8413888889,11,17,0,19,26,0,0,30,4,"4",1.60714285714286,1.86666666666667 +"vue-router",-2.7239892069,-0.137337361,-3.3068761493,"https://salsa.debian.org/js-team/vue-router.js","https://github.com/vuejs/vue-router/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA +"vue",-1.0931356092,1.0186682685,-1.5343339016,"https://salsa.debian.org/js-team/vue.js","https://github.com/vuejs/vue/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA +"link-checker",1.0779084142,3.0562972028,0.1151150994,"https://salsa.debian.org/perl-team/modules/packages/w3c-linkchecker","https://github.com/w3c/link-checker/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA +"emacs-w3m",-0.0316215167,0.794577588,-0.429835318,"https://salsa.debian.org/debian/w3m-el-snapshot","https://github.com/emacs-w3m/emacs-w3m",5732.8756134259,8,17,0,19,38,0,2,46,4,"4",1.68,1.82608695652174 +"wadc",-1.3114197782,1.1488153676,-1.8942921561,"https://github.com/jmtd/wadc","https://github.com/jmtd/wadc",2669.3253125,2,7,0,3,5,0,0,5,1,"1",1.77777777777778,2 +"wajig",-0.2563640933,-0.2041280932,-0.289877151,"https://github.com/gjwgit/wajig/wajig","https://github.com/gjwgit/wajig",4746.4752546296,1,8,0,5,1,0,0,5,3,"3",1.88888888888889,1.2 +"wakeonlan",0.5347762299,2.3981769483,-0.0392961396,"https://salsa.debian.org/debian/wakeonlan","https://github.com/jpoliv/wakeonlan/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA +"wavbreaker",-0.3043692646,1.3080197333,-0.6434518402,"https://salsa.debian.org/multimedia-team/wavbreaker","https://github.com/thp/wavbreaker.git",5680.2477546296,3,6,0,9,15,12,0,28,4,"4",1.66666666666667,1.53571428571429 +"wbar",0.7206963622,2.6363178504,-0.1640676109,"https://salsa.debian.org/debian/wbar","https://github.com/rodolf0/wbar",1881.7045949074,0,2,0,1,2,0,0,3,1,"1",2,1.66666666666667 +"wcc",-2.4281741601,-0.9182887345,-2.9205469788,"https://salsa.debian.org/pkg-security-team/wcc","https://github.com/endrazine/wcc.git",2370.6538888889,7,12,0,16,41,0,4,45,1,"1",1.63157894736842,1.91111111111111 +"whysynth",1.6273877466,4.7945023636,0.3840495858,"https://salsa.debian.org/multimedia-team/whysynth","https://github.com/smbolton/whysynth.git",2132.1219444445,2,3,0,3,12,0,0,12,1,"1",1.6,2 +"wifite2",0.0691397747,1.3596647886,-0.2821965899,"https://salsa.debian.org/pkg-security-team/wifite","https://github.com/kimocoder/wifite2.git",3100.7875578704,19,31,0,35,28,0,0,57,2,"2",1.62,1.49122807017544 +"wiki2beamer",0.1072484039,2.9680033901,-0.7874436627,"https://salsa.debian.org/debian/wiki2beamer","https://github.com/wiki2beamer/wiki2beamer/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA +"wildmidi",1.1220449003,2.8689328624,0.3931106893,"https://salsa.debian.org/games-team/WildMIDI","https://github.com/psi29a/wildmidi.git",5284.7473726852,7,25,0,19,8,0,2,25,4,"4",1.78125,1.32 +"Willow",-0.3050026421,2.6837460292,-1.2006814281,"https://salsa.debian.org/python-team/packages/willow","https://github.com/torchbox/Willow/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA +"win-iconv",-0.1253180043,3.3611034506,-1.2784857777,"https://salsa.debian.org/debian/win-iconv","https://github.com/win-iconv/win-iconv",2428.4399189815,1,14,0,10,21,0,0,25,1,"1",1.93333333333333,1.84 +"winregfs",0.1505432946,2.5663630742,-0.3792554253,"https://salsa.debian.org/pkg-security-team/winregfs","https://github.com/jbruchon/winregfs",3358.8025694445,0,4,0,1,4,0,0,4,2,"2",2,2 +"wipe",0.0654274281,0.5099289571,-0.121010634,"https://salsa.debian.org/pkg-security-team/wipe","https://github.com/berke/wipe",5088.8252430556,3,5,0,3,11,0,0,12,4,"4",1.625,1.91666666666667 +"wiimms-iso-tools",-0.0137410528,2.2594017696,-0.6295812818,"https://salsa.debian.org/debian/wit","https://github.com/Wiimm/wiimms-iso-tools",764.4320717593,0,4,0,1,29,0,0,29,1,"1",2,2 +"with-simulated-input",-1.6136419534,0.6542791635,-2.0643984034,"https://salsa.debian.org/emacsen-team/with-simulated-input-el","https://github.com/DarwinAwardWinner/with-simulated-input.git",1593.3461921296,0,2,0,2,10,0,0,10,1,"1",2,2 +"wmaker",3.0318169815,3.5049705647,2.6333575748,"https://salsa.debian.org/wmaker-team/wmaker","https://github.com/window-maker/wmaker/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA +"wmbubble",0.3313340448,2.0551511806,-0.5004056988,"https://salsa.debian.org/wmaker-team/wmbubble","https://github.com/rnjacobs/wmbubble.git",3203.1598148148,0,5,0,2,5,0,0,5,2,"2",2,2 +"wmcoincoin",-1.1120470309,0.9428298773,-1.8126592182,"https://salsa.debian.org/wmaker-team/wmcoincoin","https://github.com/seeschloss/wmcoincoin/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA +"wmfrog",-0.6195008592,0.7362802602,-1.1251650057,"https://salsa.debian.org/wmaker-team/wmfrog","https://github.com/tcolar/wmfrog",4191.3952777778,0,7,0,2,2,0,0,2,3,"3",2,2 +"dockapps",0.2210226862,1.7529658495,-0.3718627509,"https://salsa.debian.org/wmaker-team/wmhdplop","https://github.com/window-maker/dockapps/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA +"wmpinboard",0.329930821,2.2481564254,-0.5833982398,"https://salsa.debian.org/wmaker-team/wmpinboard","https://github.com/bbidulock/wmpinboard.git",274.6021412037,0,3,0,2,2,0,0,3,1,"1",2,1.66666666666667 +"wmsysmon",3.6819786619,6.9497194781,2.2222684502,"https://salsa.debian.org/wmaker-team/wmsysmon","https://github.com/voyageur/wmsysmon.git",1940.3190625,0,3,0,2,3,0,0,3,1,"1",2,2 +"wokkel",-0.7494414246,1.5960211892,-1.3587677327,"https://salsa.debian.org/python-team/packages/wokkel","https://github.com/ralphm/wokkel.git",4842.8803125,0,5,0,5,26,0,0,27,3,"3",2,1.96296296296296 +"wondershaper",2.1493592104,4.1791752632,1.0723154812,"https://github.com/leggewie-DM/wondershaper","https://github.com/leggewie-DM/wondershaper",3187.6698263889,2,1,0,2,2,0,0,4,2,"2",1.33333333333333,1.5 +"wreport",-0.1794776423,1.6143054556,-0.8172719944,"https://github.com/ARPA-SIMC/wreport","https://github.com/ARPA-SIMC/wreport",4700.94625,2,14,0,5,11,0,0,11,3,"3",1.875,2 +"wslay",-0.3233505839,2.0096579304,-1.031639712,"https://salsa.debian.org/debian/wslay","https://github.com/tatsuhiro-t/wslay",2229.7935185185,3,18,1,17,70,0,0,71,1,"1",1.85714285714286,1.98591549295775 +"wtf-peewee",-1.1933920451,1.3018762525,-1.741694338,"https://salsa.debian.org/python-team/packages/wtf-peewee","https://github.com/coleifer/wtf-peewee",4437.0799652778,3,18,0,15,46,0,0,46,3,"3",1.85714285714286,2 +"wxAstroCapture",0.3727354069,3.1734912044,-0.4080125191,"https://salsa.debian.org/science-team/wxastrocapture","https://github.com/wxAstro/wxAstroCapture",45.0595833333,0,3,0,2,2,0,0,3,1,"1",2,1.66666666666667 +"wxGlade",-0.2335267372,0.1233893747,-0.4233597056,"https://salsa.debian.org/georgesk/wxglade","https://github.com/wxGlade/wxGlade/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA +"x11-touchscreen-calibrator",-0.1154983302,2.6722200137,-0.7875374212,"https://github.com/fourdollars/x11-touchscreen-calibrator","https://github.com/fourdollars/x11-touchscreen-calibrator",2225.1995717593,0,4,0,2,5,0,0,6,1,"1",2,1.83333333333333 +"x42-plugins",-0.1526190502,0.5990375172,-0.384890654,"https://salsa.debian.org/multimedia-team/x42-plugins","https://github.com/x42/x42-plugins",3642.2395023148,0,1,0,1,0,0,0,1,2,"2",2,1 +"xandikos",-1.700889354,-1.3947312282,-1.7687283402,"https://salsa.debian.org/jelmer/xandikos","https://github.com/jelmer/xandikos/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA +"xbomb.debian",2.5167931875,5.6510697336,1.1667397783,"https://github.com/alexdantas/xbomb.debian","https://github.com/alexdantas/xbomb.debian",472.1825347222,1,2,0,0,3,0,0,3,1,"1",1.66666666666667,2 +"xindy",0.1823763954,0.8822842515,-0.1274514217,"https://github.com/debian-tex/xindy","https://github.com/debian-tex/xindy",2719.8550694445,2,6,0,4,1,0,0,4,1,"1",1.75,1.25 +"xlsx2csv",0.199802941,2.3048255107,-0.3946294711,"https://salsa.debian.org/science-team/xlsx2csv","https://github.com/dilshod/xlsx2csv/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA +"xml-light",-0.3592724135,1.1896469114,-0.7772314943,"https://salsa.debian.org/ocaml-team/xml-light","https://github.com/ncannasse/xml-light.git",3963.0315046296,3,8,0,8,13,0,0,15,3,"3",1.72727272727273,1.86666666666667 +"xmountains",-0.6473598122,-0.4080618043,-0.6985149403,"https://salsa.debian.org/debian/xmountains","https://github.com/spbooth/xmountains/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA +"xnec2c",-0.2433745776,0.7919844064,-0.4889064627,"https://salsa.debian.org/debian-hamradio-team/xnec2c","https://github.com/KJ7LNW/xnec2c.git",5761.7881944445,5,7,0,8,22,0,0,22,4,"4",1.58333333333333,2 +"xplc",0.065119078,1.5804093595,-0.5441876363,"https://salsa.debian.org/debian/xplc","https://github.com/xplc/xplc/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA +"pkg-xppaut",0.480332333,2.5873961644,-0.4615269769,"https://github.com/neurodebian/pkg-xppaut","https://github.com/neurodebian/pkg-xppaut",171.362349537,6,2,0,3,0,0,0,3,1,"1",1.25,1 +"xprintidle",-0.1422188392,0.6249787453,-0.3518989739,"https://salsa.debian.org/debian/xprintidle","https://github.com/g0hl1n/xprintidle",3448.9179861111,2,6,2,2,15,0,0,15,2,"2",1.75,2 +"xsecurelock",-0.4681598236,2.8900823642,-1.3517451123,"https://github.com/google/xsecurelock/tree/debian","https://github.com/google/xsecurelock",3375.8872453704,17,12,2,18,50,0,0,63,2,"2",1.41379310344828,1.79365079365079 +"xtermcontrol",-0.0117403008,1.5858545623,-0.4569548478,"https://salsa.debian.org/debian/xtermcontrol","https://github.com/JessThrysoee/xtermcontrol.git",3429.399525463,0,2,0,1,17,0,0,17,2,"2",2,2 +"xtl",-4.7040789559,-1.5856206073,-5.4305613286,"https://github.com/quantstack-debian/xtl","https://github.com/quantstack-debian/xtl",1473.7952662037,0,3,0,2,1,0,0,3,1,"1",2,1.33333333333333 +"xttitle",0.8939077507,4.2706568139,-0.3819440692,"https://salsa.debian.org/debian/xttitle","https://github.com/mojotx/xttitle",2181.5912731482,2,3,0,2,2,0,0,2,1,"1",1.6,2 +"xwax",-0.5636629334,0.7271414205,-0.9498118303,"https://salsa.debian.org/multimedia-team/xwax","https://github.com/xwax/xwax.git",5550.8656712963,5,3,0,3,9,0,0,11,4,"4",1.375,1.81818181818182 +"xxdiff",0.9061004175,1.6510647261,0.4413690153,"https://salsa.debian.org/debian/xxdiff","https://github.com/blais/xxdiff.git",5451.0281134259,4,11,0,8,19,0,0,21,4,"4",1.73333333333333,1.9047619047619 +"xylib",0.6962815791,3.868426766,-0.2796991398,"https://salsa.debian.org/science-team/xylib","https://github.com/wojdyr/xylib",5291.0453703704,4,4,0,3,17,0,0,17,4,"4",1.5,2 +"yafc",-0.0272314962,0.4916391321,-0.3253666512,"https://salsa.debian.org/debian/yafc","https://github.com/sebastinas/yafc.git",4536.1716550926,4,14,0,13,27,0,0,28,3,"3",1.77777777777778,1.96428571428571 +"yagf-debian",1.2564818045,3.6319506109,0.2577483716,"https://github.com/tehnick/yagf-debian","https://github.com/tehnick/yagf-debian",2966.796875,2,1,0,2,3,0,0,3,2,"2",1.33333333333333,2 +"yagv",-0.2493109691,1.6805451528,-0.758268769,"https://salsa.debian.org/3dprinting-team/yagv","https://github.com/jonathanwin/yagv.git",1848.8749421296,0,6,0,2,24,0,0,24,1,"1",2,2 +"yajl",0.1436910943,0.8155419647,-0.0099540163,"https://github.com/jstamp/yajl","https://github.com/jstamp/yajl",5069.733125,7,28,0,22,4,0,0,23,4,"4",1.8,1.17391304347826 +"yubikey-personalization-gui-dpkg",1.0660214443,4.6214252569,-0.0477907414,"https://github.com/Yubico/yubikey-personalization-gui-dpkg","https://github.com/Yubico/yubikey-personalization-gui-dpkg",1527.8557986111,0,2,0,2,5,0,0,6,1,"1",2,1.83333333333333 +"yubikey-val-dpkg",-1.5796758821,0.5230579445,-2.2238855851,"https://github.com/Yubico/yubikey-val-dpkg","https://github.com/Yubico/yubikey-val-dpkg",2518.4995601852,1,7,0,6,3,0,0,6,1,"1",1.875,1.5 +"jay-yydebug",-2.4807565791,0.0572661247,-3.0016851771,"https://salsa.debian.org/java-team/yydebug","https://github.com/jruby/jay-yydebug",0.0429513889,0,1,0,1,2,0,0,3,1,"1",2,1.66666666666667 +"zc.lockfile",-0.0210256384,1.5379599647,-0.4550360225,"https://salsa.debian.org/python-team/packages/zc-lockfile","https://github.com/zopefoundation/zc.lockfile",5245.5974305556,1,13,0,10,19,0,0,22,4,"4",1.92857142857143,1.86363636363636 +"zed",-0.7636785221,-0.0586954945,-1.0152692364,"https://salsa.debian.org/ocaml-team/zed","https://github.com/ocaml-community/zed.git",4544.7564699074,9,14,0,17,38,0,0,40,3,"3",1.60869565217391,1.95 +"ice-debian-packaging",-0.2246270386,-0.0796274635,-0.3178149444,"https://github.com/zeroc-ice/ice-debian-packaging.git","https://github.com/zeroc-ice/ice-debian-packaging.git",2730.2990046296,3,11,0,8,6,0,0,13,1,"1",1.78571428571429,1.46153846153846 +"0install-debian",-0.1790173309,0.2373414985,-0.3531189648,"https://github.com/0install/0install-debian","https://github.com/0install/0install-debian",5324.6795949074,19,12,0,3,0,0,0,3,4,"4",1.38709677419355,1 +"zfSnap",0.4772336214,3.1494825406,-0.4433726935,"https://github.com/jgoerzen/zfSnap","https://github.com/jgoerzen/zfSnap",4429.3288888889,1,13,0,2,1,0,0,3,3,"3",1.92857142857143,1.33333333333333 +"zktop",-1.6834481359,1.4483848388,-2.5079762953,"https://salsa.debian.org/python-team/packages/zktop","https://github.com/phunt/zktop.git",4096.6100115741,1,12,0,7,20,0,0,20,3,"3",1.92307692307692,2 +"zope.deprecation",-0.4002923161,1.2950694538,-0.80228492,"https://salsa.debian.org/python-team/packages/zope.deprecation","https://github.com/zopefoundation/zope.deprecation.git",5564.8963541667,6,19,0,22,15,0,0,26,4,"4",1.76,1.57692307692308 +"zope.event",0.48012603,2.4451618465,-0.0440353103,"https://salsa.debian.org/debian/zope.event","https://github.com/zopefoundation/zope.event",5503.5143634259,6,21,0,23,14,0,0,26,4,"4",1.77777777777778,1.53846153846154 +"zope.i18nmessageid",-0.5047792742,1.175715823,-1.0038159767,"https://salsa.debian.org/detiste-guest/zope.i18nmessageid","https://github.com/zopefoundation/zope.i18nmessageid",5530.7271759259,3,23,0,23,15,0,0,30,4,"4",1.88461538461538,1.5 +"zope.schema",-0.6711277163,0.5898602563,-1.0326400015,"https://salsa.debian.org/python-team/packages/zope.schema","https://github.com/zopefoundation/zope.schema",5503.5836458333,8,46,0,42,30,0,0,56,4,"4",1.85185185185185,1.53571428571429 +"zope.testing",-0.8046398038,0.1932317872,-1.1600868609,"https://salsa.debian.org/python-team/packages/zope.testing","https://github.com/zopefoundation/zope.testing",5685.8682638889,3,42,0,37,13,0,0,40,4,"4",1.93333333333333,1.325 +"zope.testrunner",-1.5178214231,-0.9479425765,-1.6556150569,"https://salsa.debian.org/python-team/packages/zope.testrunner","https://github.com/zopefoundation/zope.testrunner",4988.3216666667,11,30,0,30,32,0,0,40,4,"4",1.73170731707317,1.8 +"zpb-ttf",-0.5400082597,2.49952862,-1.5901447095,"https://salsa.debian.org/debian/zpb-ttf","https://github.com/xach/zpb-ttf",4273.1460416667,0,6,0,4,14,0,0,14,3,"3",2,2 +"7kaa",0.8733439141,3.7651893226,-0.0927531106,"https://salsa.debian.org/games-team/7kaa","https://github.com/the3dfxdude/7kaa",5126.7096643519,24,23,0,27,66,0,0,78,4,"4",1.48936170212766,1.84615384615385 +"acmetool",0.6219434866,2.6875450321,-0.2336905662,"https://salsa.debian.org/go-team/packages/acmetool","https://github.com/hlandau/acmetool",2727.716875,7,20,1,21,258,0,5,263,1,"1",1.74074074074074,1.98098859315589 +"actiona",0.2685921276,2.3898449586,-0.5658267823,"https://salsa.debian.org/debian/actiona","https://github.com/Jmgr/actiona",4932.3205439815,3,17,0,3,94,0,0,95,3,"3",1.85,1.98947368421053 +"activemq",-0.707743979,-0.252194711,-0.929017814,"https://salsa.debian.org/java-team/activemq","https://github.com/apache/activemq",5739.1228356482,56,141,2,130,160,0,0,217,4,"4",1.71573604060914,1.73732718894009 +"allegro5",-0.4762686219,-0.2153924343,-0.5311269802,"https://salsa.debian.org/games-team/allegro5","https://github.com/liballeg/allegro5.git",5772.8158680556,110,47,0,79,223,0,5,242,4,"4",1.29936305732484,1.92148760330579 +"ariba",-0.7249708667,0.7497238838,-1.1789923052,"https://salsa.debian.org/med-team/ariba","https://github.com/sanger-pathogens/ariba",3026.1963541667,10,22,0,16,112,0,8,122,2,"2",1.6875,1.91803278688525 +"asn1crypto",0.9740729842,4.1853024005,0.0865816737,"https://salsa.debian.org/python-team/packages/asn1crypto","https://github.com/wbond/asn1crypto.git",3074.7355092593,14,27,0,32,181,0,0,181,2,"2",1.65853658536585,2 +"asymptote",0.2396900664,0.5861261584,0.0399132445,"https://github.com/debian-tex/asymptote","https://github.com/debian-tex/asymptote",4223.6715162037,6,28,0,5,4,0,0,6,3,"3",1.82352941176471,1.66666666666667 +"aranym800-debian",0.2438262875,1.4111848908,-0.3223074512,"https://github.com/bobek/aranym800-debian","https://github.com/bobek/aranym800-debian",4083.2988773148,1,3,0,2,2,0,0,2,3,"3",1.75,2 +"atril",0.5207732379,1.2869272543,0.1522121334,"https://salsa.debian.org/debian-mate-team/atril","https://github.com/mate-desktop/atril.git",4392.8799768519,62,42,0,70,244,0,0,278,3,"3",1.40384615384615,1.87769784172662 +"audacity",2.0595760921,2.587904003,1.6528933115,"https://salsa.debian.org/multimedia-team/audacity","https://github.com/audacity/audacity.git",5069.8878125,215,104,0,197,438,0,8,538,4,"4",1.32601880877743,1.81412639405204 +"audioread",0.4790726237,2.8379723664,-0.2363043324,"https://salsa.debian.org/python-team/packages/audioread","https://github.com/sampsyo/audioread.git",4407.0006944445,7,21,0,23,126,0,0,127,3,"3",1.75,1.99212598425197 +"autorandr",-0.3527152165,0.3171262846,-0.518389331,"https://salsa.debian.org/debian/autorandr","https://github.com/phillipberndt/autorandr.git",4779.7076736111,55,58,0,90,351,0,0,363,3,"3",1.51327433628319,1.96694214876033 +"autosuspend",-1.9250458428,0.6278109958,-2.4672708111,"https://salsa.debian.org/python-team/packages/autosuspend","https://github.com/languitar/autosuspend.git",3337.5962847222,6,9,0,13,40,0,0,46,2,"2",1.6,1.8695652173913 +"backuppc",0.439136868,0.738905733,0.2133448427,"https://salsa.debian.org/debian/backuppc","https://github.com/backuppc/backuppc",4883.1674305556,21,39,0,40,225,0,31,267,3,"3",1.65,1.84269662921348 +"rsync-bpc",-2.9537265247,0.2336355318,-3.706230506,"https://salsa.debian.org/debian/backuppc-rsync","https://github.com/backuppc/rsync-bpc",2751.3212037037,2,9,0,6,43,0,0,43,2,"2",1.81818181818182,2 +"bambam",0.3070932851,2.5075958172,-0.3413586452,"https://github.com/porridge/bambam","https://github.com/porridge/bambam",5711.2973958333,24,13,0,23,24,0,1,35,4,"4",1.35135135135135,1.68571428571429 +"barclay",0.1851801588,3.0141581768,-0.6020424346,"https://salsa.debian.org/java-team/barclay","https://github.com/broadinstitute/barclay.git",2356.7614351852,7,7,0,8,27,0,1,28,1,"1",1.5,1.96428571428571 +"bart",-0.177815138,2.1254373642,-0.6372145565,"https://salsa.debian.org/med-team/bart","https://github.com/mrirecon/bart",3390.8110185185,61,30,0,41,83,0,0,89,2,"2",1.32967032967033,1.93258426966292 +"bd",-0.5709314067,1.7639710855,-1.0717735964,"https://salsa.debian.org/debian/bd","https://github.com/vigneshwaranr/bd.git",3272.7792476852,3,12,0,10,56,0,0,57,2,"2",1.8,1.98245614035088 +"Bear",-0.3900185941,0.5954929997,-0.59709973,"https://salsa.debian.org/sramacher/bear","https://github.com/rizsotto/Bear",3987.655787037,44,19,0,53,142,0,2,183,3,"3",1.3015873015873,1.77595628415301 +"beginend",-0.9812054474,1.1475644093,-1.4790757004,"https://salsa.debian.org/emacsen-team/beginend-el","https://github.com/DamienCassou/beginend.git",3077.3105208333,8,12,0,15,21,0,0,21,2,"2",1.6,2 +"benchmark",-0.4007419552,1.9221150293,-1.2040622803,"https://salsa.debian.org/science-team/benchmark","https://github.com/google/benchmark",3640.5849537037,257,68,3,283,68,0,0,319,2,"2",1.20923076923077,1.21316614420063 +"abc",-0.0691799173,1.1526418635,-0.3926880632,"https://salsa.debian.org/science-team/berkeley-abc","https://github.com/berkeley-abc/abc.git",5782.9116666667,8,47,0,40,75,0,0,104,4,"4",1.85454545454545,1.72115384615385 +"bernhard",-3.8249138229,-1.4329465737,-4.33451812,"https://salsa.debian.org/python-team/packages/bernhard","https://github.com/b20n/bernhard.git",2059.4699652778,0,14,0,11,32,0,0,32,1,"1",2,2 +"betamax",-2.6186759503,-1.7111544465,-2.7929647164,"https://salsa.debian.org/python-team/packages/betamax","https://github.com/sigmavirus24/betamax",3448.4558796296,7,33,2,31,93,0,0,97,2,"2",1.825,1.95876288659794 +"bfs",-1.1164889975,-0.5498955731,-1.1990984125,"https://salsa.debian.org/lamby/pkg-bfs","https://github.com/tavianator/bfs.git",2311.7626273148,11,10,0,19,35,0,0,42,1,"1",1.47619047619048,1.83333333333333 +"birdfont",0.1539215818,1.5207071994,-0.3971310294,"https://salsa.debian.org/fonts-team/birdfont","https://github.com/johanmattssonm/birdfont.git",4158.8272222222,6,15,0,15,135,0,0,138,3,"3",1.71428571428571,1.97826086956522 +"bitlbee",0.610414917,1.1334179745,0.2390336103,"https://github.com/bitlbee/bitlbee","https://github.com/bitlbee/bitlbee",5775.5242824074,54,55,0,72,85,0,0,108,4,"4",1.5045871559633,1.78703703703704 +"black",-0.2598583165,0.6526555806,-0.4835804983,"https://salsa.debian.org/python-team/packages/black","https://github.com/psf/black.git",2098.4397453704,441,11,0,416,699,0,0,1009,1,"1",1.02433628318584,1.69276511397423 +"BOSSA",0.0893999446,1.6612263593,-0.4163524525,"https://salsa.debian.org/science-team/bossa","https://github.com/shumatech/BOSSA.git",3233.4649537037,7,26,0,19,214,0,0,214,2,"2",1.78787878787879,2 +"bowtie2",-0.4173214178,-0.233072452,-0.4693075159,"https://salsa.debian.org/med-team/bowtie2","https://github.com/BenLangmead/bowtie2",4656.6302777778,6,51,0,28,425,0,1,427,3,"3",1.89473684210526,1.99531615925059 +"boxbackup",-0.8371100115,0.0115481538,-1.3264648158,"https://salsa.debian.org/debian/boxbackup","https://github.com/boxbackup/boxbackup.git",5737.3015625,2,18,0,6,16,0,3,21,4,"4",1.9,1.76190476190476 +"breathe",-0.9912135008,-0.8309389737,-1.0391354827,"https://salsa.debian.org/python-team/packages/breathe","https://github.com/michaeljones/breathe.git",5375.5645949074,34,85,0,91,286,0,0,313,4,"4",1.71428571428571,1.91373801916933 +"brewtarget",0.484432121,2.8570200814,-0.426583819,"https://salsa.debian.org/debian/brewtarget","https://github.com/Brewtarget/brewtarget.git",5451.574212963,13,84,0,55,134,0,15,163,4,"4",1.8659793814433,1.82208588957055 +"brise",-0.3080442577,1.0357450106,-0.6873683492,"https://salsa.debian.org/debian/brise","https://github.com/rime/brise",2544.8862615741,5,23,0,12,45,0,0,45,1,"1",1.82142857142857,2 +"brlaser",0.4072432263,2.1541552875,-0.0102827943,"https://salsa.debian.org/printing-team/brlaser","https://github.com/pdewacht/brlaser",3342.2059837963,4,11,0,13,27,0,3,40,2,"2",1.73333333333333,1.675 +"brotli",0.1260775007,0.5454426052,-0.0083599615,"https://salsa.debian.org/debian/brotli","https://github.com/google/brotli",3713.0230555556,77,45,0,97,42,0,5,134,2,"2",1.36885245901639,1.3134328358209 +"bruteforce-luks",0.4506857269,3.9309060924,-0.3441057365,"https://salsa.debian.org/pkg-security-team/bruteforce-luks","https://github.com/glv2/bruteforce-luks",1977.6153125,2,8,0,3,38,0,0,39,1,"1",1.8,1.97435897435897 +"brutespray",-0.0085744737,2.0622651196,-0.445603786,"https://salsa.debian.org/pkg-security-team/brutespray","https://github.com/x90skysn3k/brutespray",2174.873599537,7,10,0,8,19,0,0,21,1,"1",1.58823529411765,1.9047619047619 +"bump2version",-0.6601711919,1.365143433,-1.1463637777,"https://salsa.debian.org/debian/bumpversion","https://github.com/c4urself/bump2version",3866.5811574074,20,43,3,48,254,0,0,265,3,"3",1.68253968253968,1.95849056603774 +"bundler",0.575011715,1.5392481898,0.1010337669,"https://salsa.debian.org/ruby-team/bundler","https://github.com/carlhuda/bundler",4417.961099537,292,766,15,370,17,0,0,383,3,"3",1.72400756143667,1.0443864229765 +"bzflag",0.8319129626,1.4300701689,0.417821043,"https://salsa.debian.org/games-team/bzflag","https://github.com/BZFlag-Dev/bzflag.git",5782.5434259259,11,63,0,19,30,0,4,39,4,"4",1.85135135135135,1.76923076923077 +"c-ares",0.3441298781,1.1916406284,0.0308943148,"https://salsa.debian.org/debian/c-ares","https://github.com/c-ares/c-ares.git",5778.6172222222,133,22,0,136,66,0,0,177,4,"4",1.14193548387097,1.3728813559322 +"caja",1.057062654,1.8090309876,0.5578935766,"https://salsa.debian.org/debian-mate-team/caja","https://github.com/mate-desktop/caja.git",4392.0400925926,58,63,0,86,70,0,0,143,3,"3",1.52066115702479,1.48951048951049 +"caja-actions",0.1964661335,2.0196315905,-0.3640114639,"https://salsa.debian.org/debian-mate-team/caja-actions","https://github.com/mate-desktop/caja-actions",4195.368599537,3,13,0,7,3,0,0,8,3,"3",1.8125,1.375 +"caja-admin",0.3402863165,2.9173444791,-0.2366884449,"https://salsa.debian.org/debian-mate-team/caja-admin","https://github.com/infirit/caja-admin",2910.0051851852,15,12,0,17,15,0,0,24,2,"2",1.44444444444444,1.625 +"caja-dropbox",1.4193798685,4.6529613875,0.2366380339,"https://salsa.debian.org/debian-mate-team/caja-dropbox","https://github.com/mate-desktop/caja-dropbox.git",4038.0196990741,13,26,0,25,33,0,0,46,3,"3",1.66666666666667,1.71739130434783 +"caja-extensions",0.9911860003,3.1294289964,0.1496506623,"https://salsa.debian.org/debian-mate-team/caja-extensions","https://github.com/mate-desktop/caja-extensions.git",3680.0453125,11,27,0,20,70,0,0,72,2,"2",1.71052631578947,1.97222222222222 +"caja-mediainfo-tab",-0.6346427686,1.4919485733,-1.2169751217,"https://salsa.debian.org/debian-mate-team/caja-mediainfo","https://github.com/linux-man/caja-mediainfo-tab",1186.6267013889,1,3,0,1,4,0,0,4,1,"1",1.75,2 +"caja-rename",0.3395336681,2.9850659825,-0.2433789434,"https://salsa.debian.org/debian-mate-team/caja-rename","https://github.com/tari01/caja-rename",1145.7519328704,25,4,0,19,9,0,0,26,1,"1",1.13793103448276,1.34615384615385 +"camlp4",0.1711187334,1.4277083804,-0.1545568318,"https://salsa.debian.org/ocaml-team/camlp4","https://github.com/ocaml/camlp4.git",5404.4002199074,6,40,0,37,92,0,7,112,4,"4",1.8695652173913,1.82142857142857 +"Camomile",-0.1749647414,0.504631672,-0.4116548857,"https://salsa.debian.org/ocaml-team/camomile","https://github.com/yoriyuki/Camomile.git",3699.9040972222,2,16,0,11,42,0,0,43,2,"2",1.88888888888889,1.97674418604651 +"camp",-0.0635736976,2.2422646477,-0.8678185189,"https://salsa.debian.org/med-team/camp","https://github.com/IRCAD/camp.git",3917.821412037,2,16,0,8,2,0,0,9,3,"3",1.88888888888889,1.22222222222222 +"can-utils",-0.3151818427,1.0524810842,-0.6128426897,"https://salsa.debian.org/debian/can-utils","https://github.com/linux-can/can-utils.git",5750.4572916667,42,46,0,66,298,0,0,305,4,"4",1.52272727272727,1.97704918032787 +"cftime",-0.053984567,2.1351568503,-0.4726880086,"https://salsa.debian.org/debian-gis-team/cftime/","https://github.com/Unidata/cftime",5698.2503472222,7,40,1,25,111,0,0,112,4,"4",1.85106382978723,1.99107142857143 +"Charm",-0.4441384118,1.2230812043,-0.8796829957,"https://salsa.debian.org/qt-kde-team/extras/charmtimetracker","https://github.com/KDAB/Charm",5169.2869097222,10,73,1,44,89,0,0,100,4,"4",1.87951807228916,1.89 +"chaussette",-2.3973132585,0.1079287529,-3.3352905378,"https://github.com/circus-tent/chaussette","https://github.com/circus-tent/chaussette",1782.6774768519,1,42,0,30,80,0,0,81,1,"1",1.97674418604651,1.98765432098765 +"selinux",-0.0767985152,0.1858102911,-0.1733620099,"https://salsa.debian.org/selinux-team/checkpolicy","https://github.com/SELinuxProject/selinux",5592.8363425926,179,30,0,124,83,0,12,182,4,"4",1.14354066985646,1.45604395604396 +"CheeseCutter",-0.8909922436,1.8346147461,-1.5014964432,"https://salsa.debian.org/multimedia-team/cheesecutter","https://github.com/theyamo/CheeseCutter",2936.8167824074,4,11,0,7,20,0,0,21,2,"2",1.73333333333333,1.95238095238095 +"cheetah3",0.2580754956,1.2098434945,-0.0894485619,"https://salsa.debian.org/python-team/packages/cheetah","https://github.com/CheetahTemplate3/cheetah3.git",5732.7751157407,17,23,0,34,45,0,0,61,4,"4",1.575,1.73770491803279 +"chemical-mime",0.9334467969,3.3064633303,0.1037865392,"https://salsa.debian.org/debichem-team/chemical-mime-data","https://github.com/dleidert/chemical-mime",3567.6745833333,0,2,0,1,4,0,0,5,2,"2",2,1.8 +"CheMPS2",-1.0331384848,-0.1979810762,-1.3111906152,"https://salsa.debian.org/debichem-team/chemps2","https://github.com/SebWouters/CheMPS2",3010.6861342593,0,9,0,4,35,0,0,35,2,"2",2,2 +"chromaprint",0.3600324626,1.3936683063,0.0316097075,"https://salsa.debian.org/multimedia-team/chromaprint","https://github.com/acoustid/chromaprint",4607.495162037,12,19,3,25,78,0,3,89,3,"3",1.61290322580645,1.87640449438202 +"chuck",1.0629400647,3.5097730621,-0.0355368923,"https://salsa.debian.org/debian/chuck","https://github.com/ccrma/chuck",4777.8660300926,19,55,0,45,92,0,1,108,3,"3",1.74324324324324,1.85185185185185 +"CiderWebmail",-0.6952594282,1.439044732,-1.4225189003,"https://salsa.debian.org/perl-team/modules/packages/ciderwebmail","https://github.com/CiderWebmail/CiderWebmail.git",5148.9571990741,1,13,0,5,11,0,0,12,4,"4",1.92857142857143,1.91666666666667 +"CiftiLib",-2.2337114106,-0.584429453,-2.6009802633,"https://salsa.debian.org/med-team/ciftilib","https://github.com/Washington-University/CiftiLib",3498.0756944445,2,7,0,5,8,0,0,8,2,"2",1.77777777777778,2 +"CImg",-0.3086549748,0.4682516606,-0.6897965127,"https://salsa.debian.org/science-team/cimg","https://github.com/GreycLab/CImg.git",3104.3731481482,1,34,0,11,150,0,2,161,2,"2",1.97142857142857,1.93167701863354 +"cinnamon-session",0.2019726211,0.7003204043,-0.0198993963,"https://salsa.debian.org/cinnamon-team/cinnamon-session","https://github.com/linuxmint/cinnamon-session.git",3830.8484259259,16,29,0,34,77,0,0,77,3,"3",1.64444444444444,2 +"citeproc-py",0.2650734109,3.200403032,-0.5379993649,"https://salsa.debian.org/python-team/packages/citeproc-py","https://github.com/brechtm/citeproc-py",4168.381087963,3,13,0,14,52,0,0,53,3,"3",1.8125,1.9811320754717 +"cJSON",-0.6378303304,1.1377366916,-1.0824295673,"https://salsa.debian.org/debian/cjson","https://github.com/DaveGamble/cJSON.git",4334.9435300926,37,63,0,76,105,0,0,162,3,"3",1.63,1.64814814814815 +"clasp",-0.3006037836,-0.1147250554,-0.3428180636,"https://salsa.debian.org/science-team/clasp","https://github.com/potassco/clasp",3296.9262847222,3,6,0,2,37,0,0,37,2,"2",1.66666666666667,2 +"classified-ads",-2.2983699343,-0.0320591619,-2.7796278861,"https://github.com/operatornormal/classified-ads","https://github.com/operatornormal/classified-ads",3053.9196180556,5,9,0,8,10,0,0,12,2,"2",1.64285714285714,1.83333333333333 +"cld2",0.6043981268,3.0399456446,-0.1481790802,"https://salsa.debian.org/debian/cld2","https://github.com/CLD2Owners/cld2",808.2021875,0,8,0,2,41,0,1,42,1,"1",2,1.97619047619048 +"clinfo",0.3372645422,1.6891188178,-0.1400560842,"https://salsa.debian.org/opencl-team/clinfo","https://github.com/Oblomov/clinfo",3809.3789236111,7,13,0,14,92,0,0,93,3,"3",1.65,1.98924731182796 +"ClipIt",1.4937392865,3.438028355,0.6071495445,"https://salsa.debian.org/debian/clipit","https://github.com/CristianHenzel/ClipIt.git",3780.8276736111,15,24,0,21,246,0,0,247,3,"3",1.61538461538462,1.99595141700405 +"cloc",0.3407193618,2.1059135948,-0.1842658951,"https://salsa.debian.org/debian/cloc","https://github.com/AlDanial/cloc.git",3014.5104282408,24,101,0,108,550,0,2,569,2,"2",1.808,1.96660808435852 +"cm-super",0.5096098115,1.5619464554,0.0498213871,"https://github.com/debian-tex/cm-super","https://github.com/debian-tex/cm-super",5018.3687962963,2,6,0,3,1,0,0,3,4,"4",1.75,1.33333333333333 +"cmatrix",1.2823687579,3.3153936495,0.3805014383,"https://salsa.debian.org/debian/cmatrix","https://github.com/abishekvashok/cmatrix.git",2359.866400463,20,18,0,32,137,0,2,148,1,"1",1.47368421052632,1.92567567567568 +"colmap",-0.7206786583,0.6412726598,-1.2145608955,"https://salsa.debian.org/tar/colmap","https://github.com/colmap/colmap",2802.2067824074,103,16,0,103,432,0,0,503,2,"2",1.1344537815126,1.85884691848907 +"comitup",-1.522007504,0.0892141487,-1.9480210845,"https://github.com/davesteele/comitup","https://github.com/davesteele/comitup",2830.0050115741,9,13,0,8,73,0,1,78,2,"2",1.59090909090909,1.93589743589744 +"cool-retro-term",-0.1638065917,2.2338371828,-0.670026222,"https://salsa.debian.org/tar/cool-retro-term","https://github.com/Swordfish90/cool-retro-term",3050.8032175926,23,53,0,57,1087,0,26,1115,2,"2",1.69736842105263,1.97488789237668 +"coq",1.0112440064,1.8992232667,0.4540481704,"https://salsa.debian.org/ocaml-team/coq","https://github.com/coq/coq",5785.2775347222,56,228,4,231,16,0,362,596,4,"4",1.80281690140845,1.02684563758389 +"CppAD",-0.3030038415,2.0775944536,-0.851490117,"https://salsa.debian.org/science-team/cppad","https://github.com/coin-or/CppAD",5756.9988773148,3,15,0,12,46,0,0,50,4,"4",1.83333333333333,1.92 +"cppo",-1.4562480515,0.6841532188,-1.9614183142,"https://salsa.debian.org/ocaml-team/cppo","https://github.com/mjambon/cppo.git",1459.7919444445,3,28,0,18,53,0,0,53,1,"1",1.90322580645161,2 +"cppreference-doc-debian",0.7174863837,3.9751588838,-0.3114715055,"https://github.com/p12tic/cppreference-doc-debian","https://github.com/p12tic/cppreference-doc-debian",3405.6815740741,2,6,0,5,7,0,0,8,2,"2",1.75,1.875 +"CPU-X",-0.1831351513,2.2662774746,-0.7177695187,"https://salsa.debian.org/debian/cpu-x","https://github.com/X0rg/CPU-X.git",2770.4909606482,196,13,0,145,32,0,3,177,2,"2",1.0622009569378,1.18079096045198 +"cqrlib",-0.1411361724,1.4544569834,-0.4267040837,"https://salsa.debian.org/science-team/cqrlib","https://github.com/yayahjb/cqrlib.git",2926.9641203704,0,1,0,1,3,0,0,3,2,"2",2,2 +"critcl",0.1685050423,4.7425882465,-1.273547806,"https://salsa.debian.org/tcltk-team/critcl","https://github.com/andreas-kupries/critcl",5635.5840046296,1,15,2,12,40,0,0,43,4,"4",1.9375,1.93023255813953 +"CsoundQt",-0.414726718,0.4957472098,-0.6101873218,"https://salsa.debian.org/multimedia-team/csoundqt","https://github.com/CsoundQt/CsoundQt",5612.1172222222,7,49,3,16,87,0,7,97,4,"4",1.875,1.89690721649485 +"ctemplate",0.2254790855,1.2754696215,-0.1533076819,"https://salsa.debian.org/qt-kde-team/3rdparty/ctemplate","https://github.com/OlafvdSpek/ctemplate.git",5604.6906481482,3,11,0,8,43,0,0,44,4,"4",1.78571428571429,1.97727272727273 +"CubicSDR",0.1018461625,2.3388993412,-0.4986845369,"https://salsa.debian.org/debian-hamradio-team/cubicsdr","https://github.com/cjcliffe/CubicSDR.git",3287.5204976852,11,22,0,0,330,0,18,348,2,"2",1.66666666666667,1.94827586206897 +"custodia",-1.6751213621,-0.0779781476,-2.2266335422,"https://salsa.debian.org/freeipa-team/custodia","https://github.com/latchset/custodia.git",2105.2031134259,10,5,0,11,30,0,0,30,1,"1",1.33333333333333,2 +"cvxopt",0.2544257296,0.9059783526,-0.0500804801,"https://salsa.debian.org/science-team/cvxopt","https://github.com/cvxopt/cvxopt",3827.9446875,7,5,0,7,228,0,0,228,3,"3",1.41666666666667,2 +"cyrus-sasl",1.1677078747,1.456798419,0.9287245609,"https://salsa.debian.org/debian/cyrus-sasl2","https://github.com/cyrusimap/cyrus-sasl.git",5510.1634606482,61,36,0,68,147,0,0,171,4,"4",1.37113402061856,1.85964912280702 +"dashel",-0.5070603207,1.8556035661,-1.0587894431,"https://salsa.debian.org/science-team/dashel.git","https://github.com/aseba-community/dashel.git",4686.2267708333,3,17,0,11,13,0,0,15,3,"3",1.85,1.86666666666667 +"dbab",-1.9903650996,-0.4617475154,-2.5099356053,"https://salsa.debian.org/debian/dbab","https://github.com/suntong/dbab.git",3490.7212037037,1,6,0,4,7,0,1,10,2,"2",1.85714285714286,1.7 +"dcfldd",0.243299676,1.5128715597,-0.1742035117,"https://salsa.debian.org/debian/dcfldd","https://github.com/resurrecting-open-source-projects/dcfldd",1555.0382175926,1,5,0,4,11,0,0,11,1,"1",1.83333333333333,2 +"dcmstack",-0.2179064003,2.3843724616,-1.1543074519,"https://salsa.debian.org/med-team/dcmstack","https://github.com/moloney/dcmstack.git",4236.057650463,2,11,0,8,50,0,0,51,3,"3",1.84615384615385,1.98039215686275 +"ddccontrol-db",0.5375899278,3.040666398,-0.2040495598,"https://salsa.debian.org/debian/ddccontrol-db","https://github.com/ddccontrol/ddccontrol-db",5706.4213541667,83,21,0,89,218,0,0,220,4,"4",1.20192307692308,1.99090909090909 +"ddclient",2.2300979217,3.0092386237,1.6657756531,"https://salsa.debian.org/debian/ddclient","https://github.com/ddclient/ddclient.git",5769.1157986111,45,69,0,89,144,0,7,199,4,"4",1.60526315789474,1.72361809045226 +"debiman",-2.0205023232,-0.3691368262,-2.3529854163,"https://salsa.debian.org/go-team/packages/debiman","https://github.com/Debian/debiman.git",2469.6214583333,11,3,0,12,58,0,0,61,1,"1",1.21428571428571,1.95081967213115 +"deepdiff",-0.60032076,1.9943773022,-1.1853796171,"https://salsa.debian.org/python-team/packages/deepdiff","https://github.com/seperman/deepdiff.git",3349.8121875,21,67,0,59,387,0,0,390,2,"2",1.76136363636364,1.99230769230769 +"dehydrated-hook-ddns-tsig",-1.1498688177,0.3234067787,-1.4723938378,"https://salsa.debian.org/letsencrypt-team/dehydrated-hook-ddns-tsig","https://github.com/eferdman/dehydrated-hook-ddns-tsig.git",613.6095601852,3,7,0,5,13,0,0,13,1,"1",1.7,2 +"deken",-0.1773993382,1.8798950337,-0.6127948533,"https://salsa.debian.org/multimedia-team/pd/deken","https://github.com/pure-data/deken",3169.7776041667,5,17,1,9,50,0,0,50,2,"2",1.77272727272727,2 +"derpconf",-2.1632661335,-0.2479529966,-2.7160545081,"https://salsa.debian.org/python-team/packages/derpconf","https://github.com/globocom/derpconf",4088.1859490741,0,19,0,10,21,0,0,23,3,"3",2,1.91304347826087 +"detachtty",0.7286668661,3.7996202071,-0.4663424257,"https://salsa.debian.org/debian/detachtty","https://github.com/cosmos72/detachtty.git",5063.0382175926,2,3,0,4,4,0,0,5,4,"4",1.6,1.8 +"detox",0.0760137719,1.2444609771,-0.236573077,"https://salsa.debian.org/debian/detox","https://github.com/dharple/detox",2472.5849305556,3,6,0,5,44,0,0,44,1,"1",1.66666666666667,2 +"devtodo",-0.0964373601,0.5231337283,-0.4667575617,"https://salsa.debian.org/debian/devtodo","https://github.com/alecthomas/devtodo",4517.7004398148,2,2,0,1,5,0,0,5,3,"3",1.5,2 +"dfc",0.6249482733,2.6923246378,-0.1060154397,"https://salsa.debian.org/debian/dfc","https://github.com/rolinh/dfc",3944.7026157408,10,7,0,15,23,0,0,28,3,"3",1.41176470588235,1.82142857142857 +"dhcpcd-dbus",0.116885126,3.4089949811,-0.7932984933,"https://salsa.debian.org/debian/dhcpcd-dbus","https://github.com/kobolabs/dhcpcd-dbus.git",4098.2566550926,2,6,0,3,0,0,0,3,3,"3",1.75,1 +"dhcpcd-ui",-0.0122872414,2.5695283858,-0.8367345755,"https://salsa.debian.org/debian/dhcpcd-ui","https://github.com/NetworkConfiguration/dhcpcd-ui",5203.8271875,4,2,0,5,0,0,0,5,4,"4",1.33333333333333,1 +"dhcpcd",0.6815852227,1.5374108,0.1969854249,"https://salsa.debian.org/debian/dhcpcd","https://github.com/NetworkConfiguration/dhcpcd.git",5784.3856944445,64,17,0,56,18,0,0,59,4,"4",1.20987654320988,1.30508474576271 +"dhcpdump",1.4490750412,4.1456331911,0.3872406438,"https://github.com/bbonev/dhcpdump","https://github.com/bbonev/dhcpdump",112.9948032407,0,3,0,2,3,0,0,3,1,"1",2,2 +"DHCPig",-0.9872435316,1.3324162128,-1.5205038766,"https://salsa.debian.org/pkg-security-team/dhcpig","https://github.com/kamorin/DHCPig",1930.9329398148,0,7,0,7,22,0,0,24,1,"1",2,1.91666666666667 +"dhewm3",-0.2903203144,1.9161738096,-0.7863581959,"https://salsa.debian.org/games-team/dhewm3","https://github.com/dhewm/dhewm3.git",4378.332974537,36,21,0,41,120,0,7,144,3,"3",1.36842105263158,1.83333333333333 +"diffuse",0.6569991928,3.1825265926,-0.1258422859,"https://salsa.debian.org/debian/diffuse","https://github.com/MightyCreak/diffuse.git",2779.0936226852,15,12,0,21,61,0,0,61,2,"2",1.44444444444444,2 +"dill",-0.0692957122,2.3594211277,-0.5014890362,"https://salsa.debian.org/python-team/packages/dill","https://github.com/uqfoundation/dill",5216.8620486111,22,27,2,41,513,0,0,513,4,"4",1.55102040816327,2 +"direwolf",-0.1430216901,1.3707430635,-0.6200279656,"https://salsa.debian.org/debian-hamradio-team/direwolf","https://github.com/wb2osz/direwolf",2351.9412615741,7,18,1,0,251,0,1,252,1,"1",1.72,1.99603174603175 +"django-auth-ldap",-0.7351113605,0.589742959,-1.162005947,"https://salsa.debian.org/python-team/packages/django-auth-ldap","https://github.com/django-auth-ldap/django-auth-ldap.git",5095.4516550926,18,22,0,24,215,0,0,223,4,"4",1.55,1.96412556053812 +"django-classy-tags",-0.7401841635,0.9848619547,-1.3980531867,"https://salsa.debian.org/python-team/packages/django-classy-tags","https://github.com/django-cms/django-classy-tags",4877.1677893519,15,16,2,22,70,0,0,70,3,"3",1.51612903225806,2 +"django-countries",-0.5347084486,1.3547470964,-1.2788572175,"https://salsa.debian.org/python-team/packages/django-countries","https://github.com/SmileyChris/django-countries",4972.680625,16,45,0,50,303,0,0,314,3,"3",1.73770491803279,1.96496815286624 +"django-fsm",-1.2455924049,1.7684823777,-1.9508426508,"https://salsa.debian.org/python-team/packages/django-fsm","https://github.com/viewflow/django-fsm",4622.1760763889,28,45,0,58,257,0,0,258,3,"3",1.61643835616438,1.99612403100775 +"django-haystack",-0.3668845966,1.4515254842,-0.931809609,"https://salsa.debian.org/python-team/packages/django-haystack","https://github.com/django-haystack/django-haystack",5440.2651388889,100,135,5,183,156,0,0,323,4,"4",1.57446808510638,1.48297213622291 +"pkg-django-hijack",-2.1622270176,0.0257030995,-2.8657585957,"https://github.com/Linaro/pkg-django-hijack.git","https://github.com/Linaro/pkg-django-hijack.git",1013.9897106482,0,2,0,1,0,0,0,1,1,"1",2,1 +"django-housekeeping",-0.869454572,1.948090224,-1.6153462575,"https://salsa.debian.org/python-team/packages/django-housekeeping","https://github.com/spanezz/django-housekeeping.git",2311.2066087963,0,4,0,3,4,0,0,5,1,"1",2,1.8 +"django-ipware",-0.186701027,3.4775277787,-1.1364140371,"https://salsa.debian.org/python-team/packages/django-ipware","https://github.com/un33k/django-ipware",3876.7555324074,23,8,0,26,86,0,1,87,3,"3",1.25806451612903,1.98850574712644 +"django-modeltranslation",-1.5133383269,0.6332844289,-2.2136337591,"https://salsa.debian.org/python-team/packages/django-modeltranslation","https://github.com/deschler/django-modeltranslation.git",5393.628900463,39,78,0,93,559,0,1,562,4,"4",1.66666666666667,1.99466192170819 +"django-polymorphic",-0.9862725279,0.7261077657,-1.6214857875,"https://salsa.debian.org/python-team/packages/django-polymorphic","https://github.com/django-polymorphic/django-polymorphic",5078.6096990741,41,80,1,100,253,0,0,305,4,"4",1.66115702479339,1.82950819672131 +"django-prometheus",-2.2603160573,-0.4381341974,-2.7422527304,"https://salsa.debian.org/python-team/packages/django-prometheus","https://github.com/korfuri/django-prometheus",3173.3548148148,32,30,0,50,294,0,0,294,2,"2",1.48387096774194,2 +"django-python3-ldap",-1.220695241,0.9816108419,-1.7104148484,"https://salsa.debian.org/python-team/packages/django-python3-ldap","https://github.com/etianen/django-python3-ldap",3090.7084259259,4,28,0,25,204,0,0,208,2,"2",1.875,1.98076923076923 +"django-sitetree",-1.1970109861,0.3805270522,-1.67880198,"https://salsa.debian.org/python-team/packages/django-sitetree","https://github.com/idlesign/django-sitetree",4549.666712963,6,42,0,36,185,0,0,185,3,"3",1.875,2 +"django-sortedm2m",-2.3457198242,-0.0825384392,-2.7865717155,"https://salsa.debian.org/python-team/packages/django-sortedm2m","https://github.com/jazzband/django-sortedm2m.git",4988.0868287037,13,51,0,48,177,0,0,178,4,"4",1.796875,1.99438202247191 +"dma",0.9255897857,2.1311120692,0.2618365609,"https://salsa.debian.org/debian/dma","https://github.com/corecode/dma.git",4350.2836574074,26,18,0,30,98,0,0,99,3,"3",1.40909090909091,1.98989898989899 +"dmrconfig",-4.4180298219,-0.9106394342,-5.3737002754,"https://salsa.debian.org/debian-hamradio-team/dmrconfig","https://github.com/OpenRTX/dmrconfig.git",1907.596412037,5,9,0,11,74,0,2,76,1,"1",1.64285714285714,1.97368421052632 +"dnspython",1.1275058498,2.6742605707,0.4158531709,"https://salsa.debian.org/python-team/packages/dnspython","https://github.com/rthalley/dnspython.git",5665.3041087963,41,93,0,107,427,0,2,460,4,"4",1.69402985074627,1.92826086956522 +"dnsruby",-0.234176424,1.5390828902,-0.6784148131,"https://salsa.debian.org/ruby-team/ruby-dnsruby","https://github.com/alexdalitz/dnsruby.git",5594.1314467593,4,31,0,23,77,0,3,82,4,"4",1.88571428571429,1.9390243902439 +"Doris",-3.2514630416,-2.7560514844,-3.3329815998,"https://salsa.debian.org/debian-gis-team/doris","https://github.com/TUDelftGeodesy/Doris",371.9438888889,0,6,0,3,31,0,0,33,1,"1",2,1.93939393939394 +"dosage",-0.7866623156,0.1614581475,-1.1313932158,"https://salsa.debian.org/debian/dosage","https://github.com/webcomics/dosage",4186.6960185185,22,40,1,51,112,0,0,122,3,"3",1.64516129032258,1.91803278688525 +"dosfstools",0.9576699829,1.4464254542,0.6170237773,"https://salsa.debian.org/debian/dosfstools","https://github.com/dosfstools/dosfstools.git",3911.4083101852,49,15,0,39,137,0,0,155,3,"3",1.234375,1.88387096774194 +"dpmb",-0.6691898306,1.5148767963,-1.1659559787,"https://github.com/dpmb/dpmb","https://github.com/dpmb/dpmb",3025.1458101852,5,11,1,7,14,0,0,15,2,"2",1.6875,1.93333333333333 +"dq",-0.1834293154,2.1580450192,-0.7499592676,"https://salsa.debian.org/debian/dq","https://github.com/janmojzis/dq.git",2922.0256712963,0,7,0,1,3,0,0,3,2,"2",2,2 +"drf-extensions",-1.5711074271,0.582669346,-2.2334265763,"https://salsa.debian.org/python-team/packages/drf-extensions","https://github.com/chibisov/drf-extensions.git",3758.3081018519,37,33,0,52,293,0,0,293,2,"2",1.47142857142857,2 +"drf-generators",-1.0791841561,1.9108535938,-1.8015507649,"https://salsa.debian.org/python-team/packages/drf-generators","https://github.com/brobin/drf-generators",1981.457962963,4,10,0,9,39,0,0,39,1,"1",1.71428571428571,2 +"driftnet",-0.3021441377,0.4582796981,-0.6160981524,"https://github.com/deiv/driftnet","https://github.com/deiv/driftnet",3936.0659722222,4,6,0,5,58,0,0,58,3,"3",1.6,2 +"drmaa-python",-0.9229869282,0.8943517279,-1.5388923357,"https://salsa.debian.org/med-team/drmaa","https://github.com/pygridtools/drmaa-python",3564.105462963,9,12,0,13,58,0,4,63,2,"2",1.57142857142857,1.92063492063492 +"drmips",-0.9190476493,1.6685906624,-1.6412123268,"https://github.com/brunonova/drmips/tree/debian","https://github.com/brunonova/drmips",3165.66125,3,3,0,4,0,0,0,4,2,"2",1.5,1 +"dropbear",0.4812175514,0.9754576643,0.1540354658,"https://salsa.debian.org/debian/dropbear","https://github.com/mkj/dropbear",5772.037037037,39,54,0,67,213,0,0,225,4,"4",1.58064516129032,1.94666666666667 +"dropwatch",-1.1991262604,1.5250708737,-1.8285406941,"https://salsa.debian.org/debian/dropwatch","https://github.com/nhorman/dropwatch",5326.1496296296,3,24,0,17,70,0,0,72,4,"4",1.88888888888889,1.97222222222222 +"dunst",0.3669983163,1.1637822615,0.0070676604,"https://salsa.debian.org/debian/dunst","https://github.com/dunst-project/dunst",4447.0045601852,43,111,1,126,562,0,26,653,3,"3",1.72077922077922,1.86064318529862 +"DustRacing2D",0.1730330143,3.1219082568,-0.6411485316,"https://salsa.debian.org/pino/dustrac","https://github.com/juzzlin/DustRacing2D.git",4428.4226851852,8,9,0,11,36,0,1,37,3,"3",1.52941176470588,1.97297297297297 +"e2guardian",-0.4962046033,0.8559279449,-0.8848150366,"https://salsa.debian.org/debian-edu-pkg-team/e2guardian","https://github.com/e2guardian/e2guardian",3743.8510416667,10,60,4,20,68,0,4,84,2,"2",1.85714285714286,1.80952380952381 +"editorconfig-core-c",1.5887281662,4.6075180153,0.4803432984,"https://salsa.debian.org/debian/editorconfig-core","https://github.com/editorconfig/editorconfig-core-c.git",4345.1404861111,23,19,0,32,52,0,2,54,3,"3",1.45238095238095,1.96296296296296 +"editra",-0.2633359349,1.1859959258,-0.7394398489,"https://github.com/mogaal/editra","https://github.com/mogaal/editra",1762.9254398148,0,2,0,1,2,0,0,3,1,"1",2,1.66666666666667 +"efivar",1.2395472847,3.1409084649,0.4366490781,"https://salsa.debian.org/efi-team/efivar","https://github.com/rhinstaller/efivar.git",3854.9068634259,62,9,0,62,181,0,0,184,3,"3",1.12676056338028,1.98369565217391 +"eggdrop-debian",0.690268777,1.6966766009,0.0747126473,"https://github.com/yastupin/eggdrop-debian","https://github.com/yastupin/eggdrop-debian",1023.9554166667,0,1,0,1,2,0,0,2,1,"1",2,2 +"egl-wayland",0.0316178932,1.8159648449,-0.3538526989,"https://salsa.debian.org/debian/egl-wayland","https://github.com/NVIDIA/egl-wayland.git",2464.5272800926,13,9,0,14,170,0,0,172,1,"1",1.40909090909091,1.98837209302326 +"eiciel",-0.3913934912,0.2845531206,-0.6225036497,"https://salsa.debian.org/debian/eiciel","https://github.com/rofirrim/eiciel",4391.8161689815,58,10,0,42,13,0,0,46,3,"3",1.14705882352941,1.28260869565217 +"eiskaltdcpp-debian",0.4505650107,2.0973490193,-0.2886793088,"https://github.com/eiskaltdcpp/eiskaltdcpp-debian","https://github.com/eiskaltdcpp/eiskaltdcpp-debian",3513.9242361111,0,2,0,2,3,0,0,3,2,"2",2,2 +"eja",-2.7925237394,1.0154047624,-3.9912920842,"https://github.com/ubaldus/eja","https://github.com/ubaldus/eja",3036.7696296296,0,5,0,3,3,0,0,4,2,"2",2,1.75 +"elastalert",-2.7490522153,-1.0382477163,-3.253107753,"https://salsa.debian.org/debian/elastalert","https://github.com/Yelp/elastalert.git",2822.0809490741,46,241,0,181,234,0,4,371,2,"2",1.8397212543554,1.63072776280323 +"emacs-git-messenger",-0.7394110957,1.3440255665,-1.1759453412,"https://salsa.debian.org/emacsen-team/emacs-git-messenger","https://github.com/syohex/emacs-git-messenger.git",3062.6,2,8,0,7,23,0,0,23,2,"2",1.8,2 +"git-modes",-0.5095691095,1.8818747091,-0.9450708252,"https://salsa.debian.org/emacsen-team/emacs-git-modes","https://github.com/magit/git-modes.git",4898.4598032408,8,34,0,39,64,0,0,75,3,"3",1.80952380952381,1.85333333333333 +"emacs-jedi",-0.5925564326,1.6685968963,-1.0626804159,"https://salsa.debian.org/emacsen-team/emacs-jedi","https://github.com/tkf/emacs-jedi.git",3462.8411458333,5,28,0,30,288,0,2,290,2,"2",1.84848484848485,1.99310344827586 +"emacspeak",-0.3098123339,0.154967146,-0.6063949443,"https://salsa.debian.org/a11y-team/emacspeak","https://github.com/tvraman/emacspeak.git",5784.5154976852,1,16,0,7,53,0,0,53,4,"4",1.94117647058824,2 +"enchant",0.4671232701,2.6138489169,-0.0641062097,"https://salsa.debian.org/gnome-team/enchant-2/","https://github.com/AbiWord/enchant.git",5773.2183333333,7,27,0,26,105,0,1,112,4,"4",1.79411764705882,1.9375 +"engrampa",0.3364707225,1.2009801373,-0.0018104828,"https://salsa.debian.org/debian-mate-team/engrampa","https://github.com/mate-desktop/engrampa.git",4345.1016319445,27,39,0,38,189,0,0,191,3,"3",1.59090909090909,1.98952879581152 +"erlware_commons",-1.8744095819,0.8786023846,-2.6652549432,"https://salsa.debian.org/erlang-team/packages/erlang-erlware-commons","https://github.com/erlware/erlware_commons.git",4657.9532060185,8,37,0,28,72,0,0,72,3,"3",1.82222222222222,2 +"folsom",-1.800386042,0.5181389354,-2.3318647887,"https://salsa.debian.org/erlang-team/packages/erlang-folsom","https://github.com/boundary/folsom.git",1470.0027777778,3,37,0,30,72,0,0,75,1,"1",1.925,1.96 +"jiffy",0.1668501203,2.4255381931,-0.3758394191,"https://salsa.debian.org/erlang-team/packages/erlang-jiffy","https://github.com/davisp/jiffy.git",3978.8049884259,23,14,0,27,227,0,0,227,3,"3",1.37837837837838,2 +"erlang-jose",-0.0923635531,2.3327857993,-0.5705493125,"https://salsa.debian.org/ejabberd-packaging-team/erlang-jose","https://github.com/potatosalad/erlang-jose.git",3054.6266782407,10,30,0,29,125,0,0,125,2,"2",1.75,2 +"lager",0.1330257958,2.1705993041,-0.3821435959,"https://salsa.debian.org/ejabberd-packaging-team/erlang-lager","https://github.com/erlang-lager/lager.git",4513.8316435185,17,130,0,101,372,0,1,377,3,"3",1.8843537414966,1.9867374005305 +"meck",-1.7847622485,-0.6288022984,-2.0590391976,"https://salsa.debian.org/erlang-team/packages/erlang-meck","https://github.com/eproxus/meck.git",4901.9858333333,34,45,0,52,158,0,9,176,3,"3",1.56962025316456,1.89772727272727 +"fast_tls",-0.157152573,1.1095215195,-0.4106607165,"https://salsa.debian.org/ejabberd-packaging-team/erlang-p1-tls","https://github.com/processone/fast_tls.git",3904.2279282408,5,26,0,18,52,0,0,56,3,"3",1.83870967741935,1.92857142857143 +"eredis",-0.9857886966,1.2120613864,-1.431244437,"https://salsa.debian.org/ejabberd-packaging-team/erlang-redis-client","https://github.com/wooga/eredis.git",2851.9773842593,2,48,0,34,122,0,0,123,2,"2",1.96,1.99186991869919 +"eshell-git-prompt",-0.9609411721,1.6959194934,-1.5424020682,"https://salsa.debian.org/emacsen-team/eshell-git-prompt","https://github.com/xuchunyang/eshell-git-prompt.git",2545.7433564815,1,11,0,6,11,0,0,11,1,"1",1.91666666666667,2 +"espeakup",-0.5060781696,0.017914626,-0.7493763311,"https://salsa.debian.org/a11y-team/espeakup","https://github.com/williamh/espeakup",4725.7581134259,2,6,0,4,0,0,0,4,3,"3",1.75,1 +"ettercap",0.3516997318,0.9604770242,0.005454292,"https://salsa.debian.org/pkg-security-team/ettercap","https://github.com/Ettercap/ettercap.git",4364.9420717593,13,80,0,48,36,0,12,84,3,"3",1.86021505376344,1.42857142857143 +"evilwm",0.1058350749,1.7709141502,-0.5887613795,"https://github.com/mati75/evilwm.git","https://github.com/mati75/evilwm.git",3558.3624189815,0,7,0,4,4,0,0,5,2,"2",2,1.8 +"evqueue-core",-3.8008904307,0.0055401804,-5.0310894983,"https://github.com/coldsource/evqueue-core","https://github.com/coldsource/evqueue-core",3176.9503935185,0,23,0,4,7,0,1,9,2,"2",2,1.77777777777778 +"exabgp",-0.5661496323,0.4143666278,-0.9529715,"https://github.com/Exa-Networks/exabgp/tree/debian/sid","https://github.com/Exa-Networks/exabgp",5211.7322222222,28,135,5,103,93,0,40,211,4,"4",1.82822085889571,1.44075829383886 +"f3",0.2679415625,2.6534869606,-0.2923376765,"https://salsa.debian.org/debian/f3","https://github.com/AltraMayor/f3.git",4281.9233912037,11,29,0,36,202,0,0,206,3,"3",1.725,1.98058252427184 +"fabric",0.2361201884,1.1224452265,-0.2395604756,"https://salsa.debian.org/python-team/packages/fabric","https://github.com/fabric/fabric.git",5703.0252199074,79,121,0,17,660,0,0,672,4,"4",1.605,1.98214285714286 +"fastkml",-1.1512391887,1.6385429324,-1.936594667,"https://salsa.debian.org/python-team/packages/fastkml","https://github.com/cleder/fastkml",4190.9523148148,13,36,2,36,109,0,0,110,3,"3",1.73469387755102,1.99090909090909 +"fceux",3.1366942055,8.4703461382,1.4758017291,"https://salsa.debian.org/games-team/fceux","https://github.com/TASEmulators/fceux.git",5697.8923611111,20,74,0,39,179,0,0,185,4,"4",1.78723404255319,1.96756756756757 +"fence-agents",-0.0526755775,0.7306960785,-0.3413654082,"https://salsa.debian.org/ha-team/fence-agents","https://github.com/ClusterLabs/fence-agents",5742.9759722222,67,106,0,112,160,0,0,195,4,"4",1.61271676300578,1.82051282051282 +"pkg-ferm",1.1755791706,1.9154949013,0.6944760141,"https://github.com/formorer/pkg-ferm","https://github.com/formorer/pkg-ferm",1766.1921643519,3,2,0,3,7,0,0,9,1,"1",1.4,1.77777777777778 +"ffindex",-0.3841947458,0.7848746806,-0.7256317717,"https://salsa.debian.org/med-team/ffindex","https://github.com/ahcm/ffindex.git",4107.5377777778,1,9,0,2,4,0,1,6,3,"3",1.9,1.66666666666667 +"ffmpegthumbnailer",0.6218339,1.7026039531,0.1299334729,"https://salsa.debian.org/multimedia-team/ffmpegthumbnailer","https://github.com/dirkvdb/ffmpegthumbnailer",5750.9852893519,2,26,0,21,32,0,0,49,4,"4",1.92857142857143,1.6530612244898 +"fftw3",0.5606957848,1.057025995,0.2642840796,"https://salsa.debian.org/science-team/fftw3","https://github.com/FFTW/fftw3.git",5716.0486458333,17,23,0,31,333,0,2,338,4,"4",1.575,1.98520710059172 +"FileTea",-1.4880291168,-0.5976104943,-1.6869426547,"https://salsa.debian.org/berto/filetea","https://github.com/elima/FileTea",2414.4586111111,4,1,0,2,17,0,0,18,1,"1",1.2,1.94444444444444 +"filtergen",-1.4900593021,-0.2527170414,-2.0161816495,"https://github.com/jaqx0r/filtergen/tree/debian","https://github.com/jaqx0r/filtergen",4988.9503125,3,6,0,2,5,0,0,5,4,"4",1.66666666666667,2 +"findimagedupes",0.1571397257,1.014130714,-0.2428383842,"https://salsa.debian.org/science-team/findimagedupes","https://github.com/jhnc/findimagedupes.git",5609.2984837963,0,1,0,0,16,0,0,16,4,"4",2,2 +"Fiona",-0.4518295489,0.0316996689,-0.548290247,"https://salsa.debian.org/debian-gis-team/fiona","https://github.com/Toblerity/Fiona.git",2732.0256712963,42,33,0,64,34,0,1,91,1,"1",1.44,1.37362637362637 +"firehol",0.2337473723,0.6567606394,-0.0568826659,"https://salsa.debian.org/debian/firehol","https://github.com/firehol/firehol",5475.3480324074,8,33,1,24,278,0,16,297,4,"4",1.80487804878049,1.93602693602694 +"flask-mongoengine",-1.2847143273,1.6755709624,-2.0678485801,"https://salsa.debian.org/python-team/packages/flask-mongoengine","https://github.com/mongoengine/flask-mongoengine",4513.2838078704,18,81,5,71,356,0,0,361,3,"3",1.81818181818182,1.98614958448753 +"flask-openid",0.228453383,2.6597609885,-0.3213084888,"https://salsa.debian.org/python-team/packages/flask-openid","https://github.com/mitsuhiko/flask-openid.git",4219.2356481482,6,12,0,12,96,0,0,97,3,"3",1.66666666666667,1.98969072164948 +"flask-restful",0.34791132,1.6712629803,-0.0854278525,"https://salsa.debian.org/python-team/packages/flask-restful","https://github.com/flask-restful/flask-restful",3867.9860763889,52,124,0,135,573,0,0,611,3,"3",1.70454545454545,1.93780687397709 +"flatbuffers",-1.160445057,0.9112660212,-1.581988532,"https://salsa.debian.org/debian/flatbuffers","https://github.com/google/flatbuffers.git",3592.7395138889,597,121,0,431,19,0,6,452,2,"2",1.16852367688022,1.04203539823009 +"flim",0.7666961285,1.9591073504,0.1611787583,"https://salsa.debian.org/debian/flim","https://github.com/wanderlust/flim",5370.129212963,4,13,0,8,10,0,0,12,4,"4",1.76470588235294,1.83333333333333 +"arb",0.2828492531,2.1064015572,-0.2652901459,"https://salsa.debian.org/math-team/flint-arb","https://github.com/fredrik-johansson/arb",4241.2918865741,4,42,0,34,106,0,1,108,3,"3",1.91304347826087,1.98148148148148 +"FlintQS",0.8705325607,4.2184408876,-0.1229863815,"https://salsa.debian.org/science-team/flintqs","https://github.com/sagemath/FlintQS",2671.3606365741,0,2,0,2,2,0,0,3,1,"1",2,1.66666666666667 +"flite",0.3744081413,0.8157223595,0.1404183728,"https://salsa.debian.org/a11y-team/flite","https://github.com/festvox/flite.git",1668.0555208333,9,16,0,21,106,0,0,106,1,"1",1.64,2 +"fmit",1.0288892251,2.9965682542,0.1345537728,"https://salsa.debian.org/debian/fmit","https://github.com/gillesdegottex/fmit.git",2966.0915162037,22,10,0,21,45,0,0,56,2,"2",1.3125,1.80357142857143 +"fntsample",-1.2332590184,-0.5969756101,-1.356176006,"https://salsa.debian.org/debian/fntsample","https://github.com/eugmes/fntsample.git",4121.0789467593,2,4,0,4,10,0,0,10,3,"3",1.66666666666667,2 +"master",0.5018954955,1.5987261482,0.0085779359,"https://salsa.debian.org/fonts-team/font-manager","https://github.com/FontManager/master",5185.326875,55,11,1,48,170,0,0,191,4,"4",1.16666666666667,1.89005235602094 +"Hack",0.3465705045,2.2081920487,-0.0730912243,"https://salsa.debian.org/fonts-team/fonts-hack","https://github.com/source-foundry/Hack",1976.7616666667,7,26,5,23,227,0,0,243,1,"1",1.78787878787879,1.93415637860082 +"amiri",0.0448942076,0.9201808842,-0.1302579721,"https://salsa.debian.org/fonts-team/fonts-hosny-amiri","https://github.com/alif-type/amiri.git",5474.3578935185,5,10,0,8,97,0,0,98,4,"4",1.66666666666667,1.98979591836735 +"inter",0.0129835005,2.785802699,-0.6565554603,"https://salsa.debian.org/fonts-team/fonts-inter","https://github.com/rsms/inter",2281.2912847222,23,7,3,20,124,0,0,141,1,"1",1.23333333333333,1.87943262411348 +"frogatto",0.2316946335,1.7654688811,-0.3927779946,"https://salsa.debian.org/games-team/frogatto","https://github.com/frogatto/frogatto.git",5646.0325115741,6,89,0,29,83,0,17,104,4,"4",1.93684210526316,1.79807692307692 +"Frozen-Flask",-1.5052476806,0.5681861838,-1.9677533136,"https://github.com/SimonSapin/Frozen-Flask/","https://github.com/SimonSapin/Frozen-Flask",4711.306712963,2,29,0,26,105,0,1,106,3,"3",1.93548387096774,1.99056603773585 +"fsvs",-0.0088293976,2.3566933183,-1.0467726594,"https://salsa.debian.org/debian/fsvs","https://github.com/phmarek/fsvs.git",2690.6840972222,8,4,0,3,6,0,0,7,1,"1",1.33333333333333,1.85714285714286 +"fswatch",0.0801114642,1.6766491485,-0.5710250772,"https://salsa.debian.org/debian/fswatch","https://github.com/emcrisostomo/fswatch.git",4816.5607060185,6,27,0,22,362,0,6,368,3,"3",1.81818181818182,1.98369565217391 +"ftgl",1.2143599406,2.1964355506,0.6199512905,"https://salsa.debian.org/ftgl-team/ftgl","https://github.com/frankheckenbach/ftgl",5371.3004976852,3,17,0,10,18,0,0,23,4,"4",1.85,1.78260869565217 +"funcoeszz",1.014177301,3.1202339314,0.1028457996,"https://salsa.debian.org/debian/funcoeszz","https://github.com//funcoeszz/funcoeszz",5372.2990972222,4,52,0,0,0,0,6,6,4,"4",1.92857142857143,1 +"fusioninventory-agent",0.4127421594,1.2756692416,0.0042753938,"https://salsa.debian.org/perl-team/modules/packages/fusioninventory-agent","https://github.com/fusioninventory/fusioninventory-agent.git",5660.8499537037,88,75,0,69,277,0,0,307,4,"4",1.4601226993865,1.90228013029316 +"fuzzylite",0.0236301475,2.058515685,-0.6491075451,"https://salsa.debian.org/debian/fuzzylite","https://github.com/fuzzylite/fuzzylite",3931.5160648148,3,20,0,8,30,0,0,30,3,"3",1.8695652173913,2 +"fuzzywuzzy",-0.4399858222,1.3206226327,-0.8570537668,"https://salsa.debian.org/python-team/packages/fuzzywuzzy","https://github.com/seatgeek/fuzzywuzzy",3716.0564236111,14,64,0,61,347,0,2,353,2,"2",1.82051282051282,1.98300283286119 +"fvwm2-debian",0.3091526029,0.4698895246,0.1811764904,"https://github.com/somiaj/fvwm2-debian","https://github.com/somiaj/fvwm2-debian",699.9356018519,1,3,0,1,0,0,0,1,1,"1",1.75,1 +"sight",-0.1731785778,1.2619602504,-0.8211865446,"https://salsa.debian.org/med-team/fw4spl","https://github.com/IRCAD/sight",5192.8487268519,18,189,0,40,13,0,0,45,4,"4",1.91304347826087,1.28888888888889 +"fwupdate",-0.0344756086,2.1966931571,-0.4710643437,"https://salsa.debian.org/efi-team/fwupdate","https://github.com/rhinstaller/fwupdate.git",2299.0056365741,21,5,0,15,40,0,3,49,1,"1",1.19230769230769,1.81632653061224 +"fzy",-0.3762088336,1.9399715065,-0.8640459444,"https://salsa.debian.org/debian/fzy","https://github.com/jhawthorn/fzy",2752.1003125,14,25,0,30,165,0,3,168,2,"2",1.64102564102564,1.98214285714286 +"g810-led",-0.8841874287,0.5790349373,-1.1503333071,"https://salsa.debian.org/debian/g810-led","https://github.com/MatMoul/g810-led.git",2361.9422453704,17,31,0,31,369,0,2,376,1,"1",1.64583333333333,1.9813829787234 +"monitor-core",1.9418594289,3.110187068,1.2272175248,"https://salsa.debian.org/debian/ganglia","https://github.com/ganglia/monitor-core.git",5029.4003703704,5,128,0,60,190,0,20,215,4,"4",1.96240601503759,1.88372093023256 +"ganglia-web",2.9867677001,5.9425493751,1.6513889403,"https://salsa.debian.org/debian/ganglia-web","https://github.com/ganglia/ganglia-web",3989.7465162037,9,91,0,54,144,0,10,160,3,"3",1.91,1.9 +"garglk",0.3494600276,1.5754786967,-0.2152021362,"https://salsa.debian.org/games-team/gargoyle-free","https://github.com/garglk/garglk.git",5517.4756134259,6,35,0,30,137,0,4,145,4,"4",1.85365853658537,1.9448275862069 +"gaupol",0.4507268429,1.4194389083,0.0001075777,"https://salsa.debian.org/python-team/packages/gaupol","https://github.com/otsaloma/gaupol",5574.4414699074,17,10,0,13,96,0,0,102,4,"4",1.37037037037037,1.94117647058824 +"geographiclib",-0.2708682617,0.4210044305,-0.5188380677,"https://salsa.debian.org/debian-gis-team/geographiclib","https://github.com/geographiclib/geographiclib.git",5589.1283333333,0,17,0,9,0,0,0,9,4,"4",2,1 +"geoipupdate",0.0025717488,1.6500054943,-0.358124043,"https://salsa.debian.org/debian/geoipupdate","https://github.com/maxmind/geoipupdate",3751.8112615741,25,42,0,34,57,0,0,77,2,"2",1.62686567164179,1.74025974025974 +"geolinks",-0.181262941,2.4550244029,-0.7445474906,"https://salsa.debian.org/debian-gis-team/geolinks","https://github.com/geopython/geolinks.git",3405.8642361111,2,3,0,4,8,0,0,8,2,"2",1.6,2 +"geophar",-0.941493032,-0.2177195536,-1.1312469677,"https://salsa.debian.org/georgesk/geophar","https://github.com/wxgeo/geophar",4439.4260185185,0,6,0,3,5,0,0,7,3,"3",2,1.71428571428571 +"geopy",-0.1987709641,1.3312828211,-0.5312977883,"https://salsa.debian.org/python-team/packages/geopy","https://github.com/geopy/geopy",5485.118125,94,49,3,101,381,0,0,395,4,"4",1.34265734265734,1.96455696202532 +"gerbv",0.7065741787,1.742115916,0.1740178886,"https://salsa.debian.org/electronics-team/gerbv","https://github.com/gerbv/gerbv.git",5724.3901851852,29,11,0,24,49,0,0,64,4,"4",1.275,1.765625 +"ghp-import",-0.4929741774,2.5133796067,-1.274122331,"https://salsa.debian.org/python-team/packages/ghp-import","https://github.com/c-w/ghp-import.git",4494.8705092593,15,11,0,21,78,0,0,84,3,"3",1.42307692307692,1.92857142857143 +"git-big-picture",0.3518387907,3.3166834133,-0.4853412989,"https://salsa.debian.org/python-team/packages/git-big-picture","https://github.com/git-big-picture/git-big-picture.git",5024.3069097222,14,10,0,14,46,0,0,48,4,"4",1.41666666666667,1.95833333333333 +"git-ftp",-0.1788027121,1.7435604018,-0.6973926208,"https://salsa.debian.org/debian/git-ftp","https://github.com/git-ftp/git-ftp",4532.203599537,24,92,3,82,432,0,0,479,3,"3",1.79310344827586,1.90187891440501 +"gitinspector",-0.5400481096,0.210511756,-0.7012239295,"https://salsa.debian.org/python-team/packages/gitinspector","https://github.com/ejwa/gitinspector",3089.9889236111,14,6,3,18,213,0,0,217,2,"2",1.3,1.9815668202765 +"gitsome",-1.5867602711,-1.1930128544,-1.6624023004,"https://salsa.debian.org/debian/gitsome","https://github.com/donnemartin/gitsome",1294.2226388889,14,16,0,27,199,0,0,199,1,"1",1.53333333333333,2 +"givaro",0.5117865646,1.6258650747,-0.0135088131,"https://salsa.debian.org/math-team/givaro","https://github.com/linbox-team/givaro",5710.7340740741,9,44,0,21,43,0,0,44,4,"4",1.83018867924528,1.97727272727273 +"lieer",-1.7520281461,0.654977795,-2.4063141302,"https://salsa.debian.org/debian/lieer","https://github.com/gauteh/lieer",2464.2436689815,23,14,0,29,147,0,7,154,1,"1",1.37837837837838,1.95454545454545 +"gmrender-resurrect",-0.6885555604,0.4388812357,-0.9886243591,"https://salsa.debian.org/debian/gmrender-resurrect","https://github.com/hzeller/gmrender-resurrect.git",3933.2407407407,9,14,0,17,244,0,41,286,3,"3",1.60869565217391,1.85314685314685 +"gnome-gmail",0.1152563841,1.2377514132,-0.3137068328,"https://github.com/davesteele/gnome-gmail/tree/debian","https://github.com/davesteele/gnome-gmail",5107.0565740741,6,30,0,8,52,0,0,53,4,"4",1.83333333333333,1.9811320754717 +"gnome-hwp-support",-0.1527039415,2.6330164164,-0.8636063871,"https://salsa.debian.org/l10n-korean-team/gnome-hwp-support","https://github.com/changwoo/gnome-hwp-support.git",4275.4146296296,1,2,0,1,2,0,0,2,3,"3",1.66666666666667,2 +"gnome-keysign",-0.6319731543,0.8678564413,-0.9085456046,"https://salsa.debian.org/debian/gnome-keysign","https://github.com/gnome-keysign/gnome-keysign",3520.8003356482,42,26,0,52,24,0,0,62,2,"2",1.38235294117647,1.38709677419355 +"gnome-mastermind",0.1896631142,2.1249915571,-0.4064733165,"https://salsa.debian.org/debian/gnome-mastermind","https://github.com/fargiolas/gnome-mastermind",5420.9395486111,1,6,0,3,2,0,0,3,4,"4",1.85714285714286,1.66666666666667 +"googler",-0.3686431402,0.6283580924,-0.5542725364,"https://salsa.debian.org/debian/googler","https://github.com/jarun/googler.git",4778.9107060185,15,26,0,29,68,0,6,94,3,"3",1.63414634146341,1.72340425531915 +"GPaste",-0.3060429164,-0.2513668941,-0.3230260451,"https://salsa.debian.org/debian/gpaste","https://github.com/Keruspe/GPaste",4709.6430092593,65,21,2,60,352,0,0,376,3,"3",1.24418604651163,1.93617021276596 +"gpick",0.3287244142,1.9268349477,-0.1661653459,"https://salsa.debian.org/elias/gpick","https://github.com/thezbyg/gpick.git",5237.0590625,5,6,0,8,64,0,1,67,4,"4",1.54545454545455,1.95522388059702 +"grabserial",-0.534268649,2.390246914,-1.2967244647,"https://salsa.debian.org/debian/grabserial","https://github.com/tbird20d/grabserial",3634.0012152778,11,19,0,17,53,0,1,55,2,"2",1.63333333333333,1.96363636363636 +"grantlee",0.8850917122,2.9819943474,0.1506454305,"https://salsa.debian.org/qt-kde-team/extras/grantlee","https://github.com/steveire/grantlee.git",4939.9756481482,29,11,0,23,19,0,1,37,3,"3",1.275,1.51351351351351 +"graphite",0.3733807726,1.1779395242,0.0796158429,"https://salsa.debian.org/libreoffice-team/graphite2","https://github.com/silnrsi/graphite.git",4797.7791319445,6,20,0,12,63,0,0,66,3,"3",1.76923076923077,1.95454545454545 +"gravit",0.6045580957,3.2029078171,-0.2991692425,"https://salsa.debian.org/debian-astro-team/gravit","https://github.com/gak/gravit",4467.9773263889,1,15,2,3,13,0,0,13,3,"3",1.9375,2 +"grcompiler",-0.2033731514,1.6514805751,-0.9604435457,"https://salsa.debian.org/fonts-team/grcompiler","https://github.com/silnrsi/grcompiler.git",4870.0000925926,3,20,0,10,14,0,0,15,3,"3",1.8695652173913,1.93333333333333 +"gsa",0.417412477,2.9619681562,-0.4656797598,"https://salsa.debian.org/pkg-security-team/greenbone-security-assistant","https://github.com/greenbone/gsa",5193.7357407407,22,54,0,37,36,0,0,62,4,"4",1.71052631578947,1.58064516129032 +"grepcidr-pkg-debian",-0.000512138,1.8231074226,-0.4693331824,"https://github.com/rfinnie/grepcidr-pkg-debian","https://github.com/rfinnie/grepcidr-pkg-debian",3175.8474652778,0,1,0,1,0,0,0,1,2,"2",2,1 +"grok",0.7555036124,3.2549577139,-0.2949948657,"https://salsa.debian.org/debian/grok","https://github.com/jordansissel/grok",2851.8223263889,0,12,0,5,47,0,0,47,2,"2",2,2 +"gromit-mpx",-0.1368392632,2.3961082606,-0.7236856316,"https://salsa.debian.org/debian/gromit-mpx","https://github.com/bk138/gromit-mpx.git",5287.5376388889,14,15,0,22,52,0,0,63,4,"4",1.51724137931034,1.82539682539683 +"grun",3.4314737452,6.9914396992,1.9512456029,"https://salsa.debian.org/debian/grun","https://github.com/lrgc/grun.git",1780.0517708333,1,4,0,2,2,0,0,3,1,"1",1.8,1.66666666666667 +"textfsm",-1.959276856,0.4998119958,-2.4671799826,"https://salsa.debian.org/python-team/packages/gtextfsm","https://github.com/google/textfsm.git",4331.1065625,11,7,0,12,114,0,11,125,3,"3",1.38888888888889,1.912 +"gtimelog",-0.3131503011,0.4195928542,-0.6469396999,"https://salsa.debian.org/python-team/packages/gtimelog","https://github.com/gtimelog/gtimelog",5699.091412037,18,41,2,31,102,0,0,108,4,"4",1.69491525423729,1.94444444444444 +"gtkhash",-0.0470549768,0.3813091669,-0.1959531443,"https://salsa.debian.org/debian/gtkhash","https://github.com/tristanheaven/gtkhash",4558.9808449074,79,10,0,62,43,0,0,96,3,"3",1.1123595505618,1.44791666666667 +"guessit",0.5092433942,2.4339696308,-0.2792039187,"https://salsa.debian.org/python-team/packages/guessit","https://github.com/guessit-io/guessit.git",2993.2388078704,14,29,0,17,232,0,0,242,2,"2",1.67441860465116,1.95867768595041 +"guidata",0.226943724,2.7660796551,-0.444547265,"https://salsa.debian.org/science-team/guidata","https://github.com/Codra-Ingenierie-Informatique/guidata",4839.0752893519,0,24,0,9,22,0,0,27,3,"3",2,1.81481481481481 +"guile-json",-0.447679014,2.3175980112,-1.1284049069,"https://salsa.debian.org/debian/guile-json","https://github.com/aconchillo/guile-json.git",3764.8305324074,3,17,0,14,43,0,0,45,2,"2",1.85,1.95555555555556 +"harminv",-0.2633327682,0.7959993879,-0.5621576388,"https://salsa.debian.org/alteholz/harminv","https://github.com/NanoComp/harminv",2906.4731712963,1,5,0,4,15,0,0,15,2,"2",1.83333333333333,2 +"harvid",0.172456355,1.3037883065,-0.1734116499,"https://salsa.debian.org/multimedia-team/harvid","https://github.com/x42/harvid.git",3621.9749189815,0,4,0,4,14,0,0,14,2,"2",2,2 +"hashcat",0.6568099259,2.9193273288,-0.0688683154,"https://salsa.debian.org/pkg-security-team/hashcat","https://github.com/hashcat/hashcat.git",2915.0251851852,48,153,0,135,297,0,0,392,2,"2",1.76119402985075,1.75765306122449 +"haveged",0.9608769092,1.929900484,0.4239904529,"https://salsa.debian.org/debian/haveged","https://github.com/jirka-h/haveged",1886.382650463,9,23,0,22,68,0,1,73,1,"1",1.71875,1.93150684931507 +"haxe-debian",-0.5201211998,0.2916566292,-0.8543651007,"https://github.com/HaxeFoundation/haxe-debian","https://github.com/HaxeFoundation/haxe-debian",5039.1597916667,3,5,0,5,4,0,0,7,4,"4",1.625,1.57142857142857 +"hcxdumptool",0.1119022392,3.6410156171,-0.7455348999,"https://salsa.debian.org/pkg-security-team/hcxdumptool","https://github.com/ZerBea/hcxdumptool",2117.0106134259,10,18,0,22,84,0,7,102,1,"1",1.64285714285714,1.82352941176471 +"hdapsd",0.6538996291,2.6942351149,-0.1231193096,"https://salsa.debian.org/debian/hdapsd","https://github.com/evgeni/hdapsd.git",2619.5010416667,2,5,0,5,12,0,0,13,1,"1",1.71428571428571,1.92307692307692 +"HDMI2USB-mode-switch",-0.1979989796,2.8942330744,-1.0013410785,"https://salsa.debian.org/debian/hdmi2usb-mode-switch","https://github.com/timvideos/HDMI2USB-mode-switch.git",1539.4512152778,3,11,0,8,15,0,0,15,1,"1",1.78571428571429,2 +"hesiod",1.3520798772,2.882041099,0.5698299795,"https://github.com/achernya/hesiod","https://github.com/achernya/hesiod",2444.8183564815,0,5,0,6,15,0,0,17,1,"1",2,1.88235294117647 +"hexchat",0.4113463635,1.0763225756,0.0766285755,"https://salsa.debian.org/debian/hexchat","https://github.com/hexchat/hexchat",4968.6586458333,146,71,1,160,5,0,0,162,3,"3",1.32718894009217,1.03086419753086 +"hg-git",0.321128458,1.270139629,-0.1895586953,"https://salsa.debian.org/python-team/packages/hg-git","https://github.com/schacon/hg-git.git",2615.4964467593,1,76,0,52,117,0,4,163,1,"1",1.98701298701299,1.71779141104294 +"hidapi",0.225542389,1.7475434274,-0.1119105457,"https://salsa.debian.org/debian/hidapi","https://github.com/libusb/hidapi.git",4972.5820717593,120,14,0,103,49,0,4,137,3,"3",1.1044776119403,1.35766423357664 +"hippomocks",-1.8899787337,1.9694566517,-3.0475420799,"https://salsa.debian.org/debian-iot-team/hippomocks","https://github.com/dascandy/hippomocks",3806.1184837963,0,35,0,21,73,0,1,77,3,"3",2,1.94805194805195 +"hitch",-0.5288912788,2.1847591306,-1.4438568394,"https://salsa.debian.org/debian/hitch","https://github.com/varnish/hitch",4466.179224537,30,59,0,59,215,0,20,260,3,"3",1.66292134831461,1.82692307692308 +"hol-light",0.6740208455,3.3227951452,-0.2913969773,"https://salsa.debian.org/ocaml-team/hol-light","https://github.com/jrh13/hol-light.git",2937.7842708333,2,18,0,10,39,0,0,39,2,"2",1.9,2 +"htmldoc",0.7571165722,1.6423946949,0.2768464827,"https://salsa.debian.org/haava/htmldoc","https://github.com/michaelrsweet/htmldoc.git",5679.7610416667,3,12,0,7,61,0,0,65,4,"4",1.8,1.93846153846154 +"htmlmin",0.3749839326,3.8009648796,-0.4061989629,"https://salsa.debian.org/python-team/packages/htmlmin","https://github.com/mankyd/htmlmin",1758.1454050926,0,22,0,16,60,0,0,60,1,"1",2,2 +"htpdate",-0.4445412636,1.6194045516,-0.91888023,"https://salsa.debian.org/debian/htpdate","https://github.com/twekkel/htpdate",706.8257407407,6,5,0,5,17,0,0,17,1,"1",1.45454545454545,2 +"hubicfuse",-0.6743910684,0.4155398958,-0.9708496832,"https://salsa.debian.org/debian/hubicfuse","https://github.com/TurboGit/hubicfuse",4598.8082291667,5,42,0,32,165,0,1,182,3,"3",1.8936170212766,1.90659340659341 +"hunspell-kk",0.1699792789,2.5686056687,-0.3539934531,"http://github.com/taem/hunspell-kk/tree/master","http://github.com/taem/hunspell-kk",1009.2540509259,0,1,0,0,0,0,0,0,1,"1",2,NA +"hw-probe",-0.2705391309,2.1366348662,-0.8036350878,"https://salsa.debian.org/debian/hw-probe","https://github.com/linuxhw/hw-probe",2812.8207638889,5,13,0,14,115,0,0,116,2,"2",1.72222222222222,1.99137931034483 +"hwdata",0.2497218136,0.8673309736,-0.0033926663,"https://salsa.debian.org/pino/hwdata","https://github.com/vcrhonek/hwdata.git",5761.1231481482,4,18,0,12,14,0,0,19,4,"4",1.81818181818182,1.73684210526316 +"hwinfo",1.0352583411,1.8703572076,0.5288235361,"https://salsa.debian.org/debian/hwinfo","https://github.com/openSUSE/hwinfo",5630.0100347222,11,25,0,19,74,0,0,77,4,"4",1.69444444444444,1.96103896103896 +"hwloc",0.034853164,0.3073992793,-0.0657896516,"https://salsa.debian.org/debian/hwloc","https://github.com/open-mpi/hwloc.git",5420.947349537,40,25,0,39,173,0,7,189,4,"4",1.38461538461538,1.91534391534392 +"hyperlink",0.844118141,3.90404712,0.0109391917,"https://salsa.debian.org/python-team/packages/hyperlink","https://github.com/python-hyper/hyperlink",1636.1480324074,8,24,0,21,47,0,0,49,1,"1",1.75,1.95918367346939 +"hyperscan",-0.1939906796,1.1323195527,-0.5069001368,"https://salsa.debian.org/debian/hyperscan","https://github.com/intel/hyperscan.git",2738.472962963,25,11,0,26,361,0,0,365,1,"1",1.30555555555556,1.98904109589041 +"ibus-libpinyin",0.0745339719,1.4965685521,-0.4552149234,"https://salsa.debian.org/debian/ibus-libpinyin","https://github.com/libpinyin/ibus-libpinyin",5637.8364236111,33,12,0,32,417,0,2,432,4,"4",1.26666666666667,1.96527777777778 +"icdiff",-0.1438152922,1.9369823287,-0.574052024,"https://salsa.debian.org/debian/icdiff","https://github.com/jeffkaufman/icdiff.git",4767.043599537,37,19,0,47,225,0,0,225,3,"3",1.33928571428571,2 +"icecream",0.3064642839,1.1295017582,-0.1573898799,"https://salsa.debian.org/qt-kde-team/extras/icecc","https://github.com/icecc/icecream",5413.4717939815,34,86,1,89,308,0,0,324,4,"4",1.71666666666667,1.95061728395062 +"ifcplusplus",-4.714020503,-1.546680493,-5.4430250217,"https://salsa.debian.org/science-team/ifcplusplus","https://github.com/ifcquery/ifcplusplus",3159.9779050926,3,29,0,17,119,0,1,120,2,"2",1.90625,1.99166666666667 +"ign-cmake",-0.0672943203,2.4451918145,-0.7211880559,"https://salsa.debian.org/science-team/ignition-cmake","https://github.com/ignitionrobotics/ign-cmake.git",2275.0046990741,21,38,0,34,52,0,0,56,1,"1",1.64406779661017,1.92857142857143 +"imexam",-0.5291204946,0.5693013221,-0.7719216675,"https://salsa.debian.org/debian-astro-team/imexam","https://github.com/spacetelescope/imexam",3485.9386226852,6,15,1,15,95,0,0,95,2,"2",1.71428571428571,2 +"imgp",-0.6548311047,1.5722939063,-1.0887948485,"https://salsa.debian.org/debian/imgp","https://github.com/jarun/imgp.git",2588.4491782407,7,6,0,8,44,0,2,47,1,"1",1.46153846153846,1.93617021276596 +"indicator-sensors",-0.5585654847,1.870631377,-1.1666724793,"https://salsa.debian.org/debian/indicator-sensors","https://github.com/alexmurray/indicator-sensors.git",4448.0518287037,1,8,0,6,33,0,1,36,3,"3",1.88888888888889,1.91666666666667 +"influxdb-python",0.5184399777,1.9994055882,-0.0609733668,"https://salsa.debian.org/python-team/packages/influxdb-python","https://github.com/influxdata/influxdb-python",3542.0853240741,64,90,1,124,596,0,0,618,2,"2",1.58441558441558,1.96440129449838 +"infnoise",-0.8043001603,2.0102163079,-1.7895799595,"https://salsa.debian.org/debian/infnoise","https://github.com/13-37-org/infnoise.git",3061.3638078704,9,32,0,27,33,0,1,52,2,"2",1.78048780487805,1.63461538461538 +"inkscape-open-symbols",0.1399161023,2.3946994301,-0.296432736,"https://salsa.debian.org/felix-guest/inkscape-open-symbols","https://github.com/Xaviju/inkscape-open-symbols",2971.3217939815,9,20,0,20,58,0,2,60,2,"2",1.68965517241379,1.96666666666667 +"compute-runtime",-0.3353488286,2.5434327002,-1.0380631241,"https://salsa.debian.org/opencl-team/intel-compute-runtime","https://github.com/intel/compute-runtime",2183.6453703704,160,87,0,159,86,0,0,220,1,"1",1.35222672064777,1.39090909090909 +"intelhex",-0.7181174872,1.5303194974,-1.1558028433,"https://salsa.debian.org/python-team/packages/intelhex","https://github.com/bialix/intelhex.git",2882.7775578704,4,21,0,12,61,0,0,63,2,"2",1.84,1.96825396825397 +"invesalius3",-0.365553699,0.412659255,-0.6585148784,"https://salsa.debian.org/med-team/invesalius","https://github.com/invesalius/invesalius3.git",5269.8872106482,20,33,0,28,105,0,9,123,4,"4",1.62264150943396,1.85365853658537 +"ioq3",0.2457529541,0.9626997446,-0.0891553792,"https://salsa.debian.org/games-team/ioquake3","https://github.com/ioquake/ioq3",5764.2156828704,42,58,0,65,301,0,0,310,4,"4",1.58,1.97096774193548 +"iortcw",-0.3609137722,1.7540737172,-0.8999552481,"https://salsa.debian.org/games-team/iortcw","https://github.com/iortcw/iortcw.git",3601.8735763889,5,20,0,13,129,0,0,131,2,"2",1.8,1.98473282442748 +"irssi",1.759294185,2.3625896628,1.3052149799,"https://salsa.debian.org/rhonda/irssi","https://github.com/irssi/irssi.git",5749.0144675926,36,142,0,114,230,0,5,301,4,"4",1.79775280898876,1.7641196013289 +"irssi-xmpp",0.6035691601,1.5557972582,0.0980337918,"https://salsa.debian.org/debian/irssi-plugin-xmpp","https://github.com/cdidier/irssi-xmpp",4266.8623958333,7,12,0,12,44,0,0,46,3,"3",1.63157894736842,1.95652173913043 +"irstlm",-0.5699998346,2.5734688359,-1.3621281388,"https://salsa.debian.org/science-team/irstlm","https://github.com/irstlm-team/irstlm.git",1268.8947337963,1,9,0,3,31,0,0,33,1,"1",1.9,1.93939393939394 +"islamic-menus",-0.8360403457,1.8927666646,-1.5208014105,"https://salsa.debian.org/islamic-team/islamic-menus","https://github.com/ojuba-org/islamic-menus",1447.6479050926,0,9,0,5,1,0,0,5,1,"1",2,1.2 +"ismrmrd",-0.4211375034,0.8719718551,-0.792919077,"https://salsa.debian.org/med-team/ismrmrd","https://github.com/ismrmrd/ismrmrd.git",4121.9187384259,23,44,0,33,72,0,1,77,3,"3",1.65671641791045,1.93506493506494 +"flags",1.0476074347,4.844542624,0.0451502018,"https://salsa.debian.org/cinnamon-team/iso-flags-svg","https://github.com/linuxmint/flags.git",563.1795833333,0,2,0,1,0,0,0,1,1,"1",2,1 +"isodate",0.7844107872,3.6859500169,-0.0654948523,"https://salsa.debian.org/python-team/packages/isodate","https://github.com/gweis/isodate",4815.1887152778,2,29,0,18,81,0,0,82,3,"3",1.93548387096774,1.98780487804878 +"ivtools",0.3988011669,1.0923186651,-0.0474693289,"https://salsa.debian.org/debian/ivtools","https://github.com/vectaport/ivtools",4623.9669328704,2,10,0,4,7,0,1,8,3,"3",1.83333333333333,1.875 +"include-what-you-use",0.2936470135,1.7756158607,-0.3256054834,"https://salsa.debian.org/pkg-llvm-team/iwyu","https://github.com/include-what-you-use/include-what-you-use",4692.8704050926,67,17,1,60,285,0,1,306,3,"3",1.20238095238095,1.93137254901961 +"jabberd2",-0.0340967947,0.9124576514,-0.5754415701,"https://salsa.debian.org/xmpp-team/jabberd2","https://github.com/jabberd2/jabberd2",3913.9184490741,17,25,0,26,119,0,5,129,3,"3",1.5952380952381,1.92248062015504 +"jansson",0.1407028183,0.668384438,-0.002779965,"https://salsa.debian.org/debian/jansson","https://github.com/akheron/jansson.git",5159.4155902778,29,84,0,80,127,0,3,188,4,"4",1.74336283185841,1.67553191489362 +"janus-gateway",-1.0533724499,0.8744335289,-1.6790293476,"https://salsa.debian.org/pkg-voip-team/janus","https://github.com/meetecho/janus-gateway",3591.8742708333,192,158,0,273,152,0,0,393,2,"2",1.45142857142857,1.38676844783715 +"jimtcl",0.0276014571,0.4709064501,-0.0432191953,"https://salsa.debian.org/debian/jimtcl","https://github.com/msteveb/jimtcl.git",5640.2291087963,31,13,0,32,66,0,2,79,4,"4",1.29545454545455,1.83544303797468 +"Jool",-2.1435730131,-0.0424378709,-2.6129119375,"https://github.com/NICMx/Jool","https://github.com/NICMx/Jool",4435.2104050926,8,57,3,37,162,0,6,172,3,"3",1.87692307692308,1.94186046511628 +"jopt-simple",-0.2557722008,1.1092730965,-0.5210596763,"https://salsa.debian.org/java-team/joptsimple","https://github.com/jopt-simple/jopt-simple.git",3771.2237962963,2,25,0,24,63,0,0,70,3,"3",1.92592592592593,1.9 +"jpy",-0.2335047706,1.5585712074,-0.6921580176,"https://salsa.debian.org/python-team/packages/jpy","https://github.com/jpy-consortium/jpy",3656.2358564815,16,28,3,25,27,0,0,44,2,"2",1.63636363636364,1.61363636363636 +"jpylyzer",-1.218476643,-0.4298985846,-1.4717139107,"https://salsa.debian.org/python-team/packages/jpylyzer","https://github.com/openpreserve/jpylyzer.git",3586.5846064815,2,28,0,16,31,0,2,37,2,"2",1.93333333333333,1.83783783783784 +"jq",0.9075077567,2.0772581347,0.3378546024,"https://salsa.debian.org/debian/jq","https://github.com/jqlang/jq",4164.9958796296,128,79,5,168,233,0,76,457,3,"3",1.38164251207729,1.50984682713348 +"jquery-i18n-properties",-0.8429862877,1.002530129,-1.1610901473,"https://salsa.debian.org/js-team/jquery-i18n-properties/","https://github.com/jquery-i18n-properties/jquery-i18n-properties.git",2244.4631597222,1,17,0,13,101,0,3,106,1,"1",1.94444444444444,1.95283018867925 +"JSJaC",-0.3265912384,2.0049639122,-1.1507866217,"https://salsa.debian.org/xmpp-team/jsjac","https://github.com/sstrigler/JSJaC.git",3682.6423958333,1,21,0,12,56,0,0,56,2,"2",1.95454545454545,2 +"json-c",0.7000238519,1.5684181486,0.2497560899,"https://salsa.debian.org/debian/json-c","https://github.com/json-c/json-c",5592.2949652778,18,150,0,130,463,0,13,500,4,"4",1.89285714285714,1.926 +"JSON-js",0.6358541009,3.1706913966,-0.0862776907,"https://salsa.debian.org/js-team/json-js","https://github.com/douglascrockford/JSON-js",4556.1964236111,1,4,0,2,14,0,0,15,3,"3",1.8,1.93333333333333 +"jsonlint",0.1283791193,1.6136347642,-0.1615279631,"https://salsa.debian.org/php-team/pear/jsonlint","https://github.com/Seldaek/jsonlint",4166.9388888889,11,28,0,34,62,0,0,62,3,"3",1.71794871794872,2 +"jsonpickle",-0.0589038511,1.6549477485,-0.6288474464,"https://salsa.debian.org/python-team/packages/jsonpickle","https://github.com/jsonpickle/jsonpickle",5737.1075462963,18,67,1,58,346,0,5,359,4,"4",1.78823529411765,1.96378830083565 +"jsusfx",-0.4818415459,1.4674471205,-0.8815812329,"https://salsa.debian.org/multimedia-team/pd/jsusfx","https://github.com/asb2m10/jsusfx.git",2697.3649768519,1,8,0,4,11,0,1,12,1,"1",1.88888888888889,1.91666666666667 +"keepassxc",0.077500136,0.7662262759,-0.1344432376,"https://salsa.debian.org/debian/keepassxc","https://github.com/keepassxreboot/keepassxc.git",4876.4075,354,94,0,352,4,0,6,360,3,"3",1.20982142857143,1.01111111111111 +"keras",0.5999454369,3.4232399441,-0.326875434,"https://salsa.debian.org/science-team/keras","https://github.com/keras-team/keras",3182.8412268519,1036,333,0,411,453,0,19,839,2,"2",1.24324324324324,1.53992848629321 +"klaus",-1.7963750896,-1.1425182339,-1.9244411722,"https://salsa.debian.org/jelmer/klaus","https://github.com/jonashaag/klaus",4576.8670717593,13,28,0,23,110,0,20,131,3,"3",1.68292682926829,1.83969465648855 +"klystrack",-0.5775196532,1.4334446874,-1.0926907229,"https://salsa.debian.org/multimedia-team/klystrack","https://github.com/kometbomb/klystrack",3882.7988194445,10,13,4,10,56,0,1,57,3,"3",1.56521739130435,1.98245614035088 +"pvr.dvbviewer",-0.2612255055,1.7338835217,-0.6785034929,"https://salsa.debian.org/multimedia-team/kodi-media-center/kodi-pvr-dvbviewer","https://github.com/kodi-pvr/pvr.dvbviewer.git",4026.1822916667,9,44,0,32,52,0,0,65,3,"3",1.83018867924528,1.8 +"pvr.hdhomerun",0.5662601343,3.972730551,-0.5089735041,"https://salsa.debian.org/multimedia-team/kodi-media-center/kodi-pvr-hdhomerun","https://github.com/kodi-pvr/pvr.hdhomerun.git",2925.247337963,9,28,0,19,39,0,0,42,2,"2",1.75675675675676,1.92857142857143 +"pvr.iptvsimple",0.0810763451,2.1337559183,-0.4122427721,"https://salsa.debian.org/multimedia-team/kodi-media-center/kodi-pvr-iptvsimple","https://github.com/kodi-pvr/pvr.iptvsimple.git",3805.7589236111,16,66,0,49,379,0,0,389,3,"3",1.80487804878049,1.97429305912596 +"pvr.njoy",-0.3919469766,1.5882858351,-0.7945898934,"https://salsa.debian.org/multimedia-team/kodi-media-center/kodi-pvr-njoy","https://github.com/kodi-pvr/pvr.njoy.git",4095.3650578704,9,40,0,28,19,0,0,33,3,"3",1.81632653061224,1.57575757575758 +"pvr.vdr.vnsi",-0.2767088162,1.1621317981,-0.6036919178,"https://salsa.debian.org/multimedia-team/kodi-media-center/kodi-pvr-vdr-vnsi","https://github.com/kodi-pvr/pvr.vdr.vnsi.git",4099.2902199074,12,57,0,44,64,0,0,80,3,"3",1.82608695652174,1.8 +"KWStyle",-0.5443680459,1.2886528987,-0.9977067271,"https://salsa.debian.org/eikel/kwstyle","https://github.com/Kitware/KWStyle",2816.187662037,4,44,0,30,32,0,0,49,2,"2",1.91666666666667,1.6530612244898 +"lablgtk",-0.5519683235,1.0254829683,-0.8566505829,"https://salsa.debian.org/ocaml-team/lablgtk3","https://github.com/garrigue/lablgtk.git",5750.3717824074,18,30,0,25,73,0,0,77,4,"4",1.625,1.94805194805195 +"lastpass-cli",-0.0433153425,1.3416622465,-0.5860041677,"https://salsa.debian.org/lamby/pkg-lastpass-cli","https://github.com/lastpass/lastpass-cli",3306.0089351852,30,62,0,67,0,0,1,68,2,"2",1.67391304347826,1 +"python-lazy-object-proxy",0.3043618863,2.7233170407,-0.1702005445,"https://salsa.debian.org/python-team/packages/lazy-object-proxy","https://github.com/ionelmc/python-lazy-object-proxy.git",3850.5882523148,8,10,0,14,87,0,0,89,3,"3",1.55555555555556,1.97752808988764 +"lcdproc",0.0416533252,0.5981870264,-0.2982890351,"https://salsa.debian.org/debian/lcdproc","https://github.com/lcdproc/lcdproc",1977.3798148148,39,20,0,41,113,0,0,115,1,"1",1.33898305084746,1.98260869565217 +"ldap-git-backup",-1.373786898,-0.3569713865,-1.6171841836,"https://github.com/elmar/ldap-git-backup","https://github.com/elmar/ldap-git-backup",3900.9497222222,1,9,0,6,10,0,0,10,3,"3",1.9,2 +"ldap2dns",0.4410660379,3.2730345751,-0.8182558109,"https://salsa.debian.org/debian/ldap2dns","https://github.com/bklang/ldap2dns",1032.2710185185,0,4,0,1,4,0,0,4,1,"1",2,2 +"ldapscripts",0.4789463026,1.4448695661,0.0155611927,"https://github.com/gerasiov/ldapscripts","https://github.com/gerasiov/ldapscripts",4203.2921643519,3,5,0,3,2,0,0,3,3,"3",1.625,1.66666666666667 +"pkg-ledgersmb",-1.9768906241,-1.2384100445,-2.32818406,"https://github.com/ledgersmb/pkg-ledgersmb","https://github.com/ledgersmb/pkg-ledgersmb",5388.1821643519,1,9,0,4,4,0,1,7,4,"4",1.9,1.57142857142857 +"ledmon",-0.0267359746,1.6972099329,-0.5787233435,"https://salsa.debian.org/debian/ledmon","https://github.com/intel/ledmon",4704.5067592593,35,24,0,32,75,0,0,79,3,"3",1.40677966101695,1.9493670886076 +"legit",-1.3724471459,-0.9914117218,-1.4783160816,"https://salsa.debian.org/python-team/packages/legit","https://github.com/frostming/legit",4465.0884027778,8,56,0,47,233,0,2,238,3,"3",1.875,1.97899159663866 +"mod_auth_openidc",0.2336891928,2.1536731239,-0.5343344056,"https://salsa.debian.org/debian/libapache2-mod-auth-openidc","https://github.com/zmartzone/mod_auth_openidc.git",3541.8657638889,12,50,0,46,138,0,41,214,2,"2",1.80645161290323,1.64485981308411 +"libappimage",-0.1632051649,2.0657738619,-0.6650493915,"https://salsa.debian.org/qt-kde-team/3rdparty/libappimage","https://github.com/AppImageCommunity/libappimage.git",1789.5842476852,9,6,0,11,54,0,0,54,1,"1",1.4,2 +"attean",-1.3143281259,1.0491513887,-1.7605023994,"https://salsa.debian.org/perl-team/modules/packages/libattean-perl","https://github.com/kasei/attean.git",3387.9902314815,2,10,0,9,20,0,0,20,2,"2",1.83333333333333,2 +"libcec",0.2382725094,0.9041078801,-0.0486730427,"https://salsa.debian.org/debian/libcec","https://github.com/Pulse-Eight/libcec.git",3960.8179282408,30,52,0,62,729,0,2,741,3,"3",1.63414634146341,1.98380566801619 +"cereal",-1.0094893182,-0.4350648989,-1.165390033,"https://salsa.debian.org/med-team/libcereal","https://github.com/USCiLab/cereal",3631.1027546296,36,60,3,68,151,0,4,201,2,"2",1.625,1.75124378109453 +"CGI--Application--Dispatch",0.204830766,4.1969078733,-0.9847022953,"https://salsa.debian.org/perl-team/modules/packages/libcgi-application-dispatch-perl","https://github.com/markstos/CGI--Application--Dispatch.git",1893.6213773148,0,9,0,8,9,0,0,9,1,"1",2,2 +"CGI-Application-Plugin-Session",-0.4119679947,2.4410793318,-1.1626629958,"https://salsa.debian.org/perl-team/modules/packages/libcgi-application-plugin-session-perl","https://github.com/frioux/CGI-Application-Plugin-Session",1734.1852083333,2,2,0,2,1,0,0,3,1,"1",1.5,1.33333333333333 +"libcgroup",0.8905633465,1.7409188519,0.3692553148,"https://salsa.debian.org/debian/libcgroup","https://github.com/libcgroup/libcgroup",5745.3289930556,43,20,2,31,36,0,0,52,4,"4",1.31746031746032,1.69230769230769 +"libdnet",0.6447638804,1.8645884536,0.1303098815,"https://salsa.debian.org/debian/libdumbnet","https://github.com/ofalk/libdnet",3068.4848032407,6,20,0,16,42,0,0,44,2,"2",1.76923076923077,1.95454545454545 +"libebur128",0.4008800859,2.5097823396,-0.0483144637,"https://salsa.debian.org/multimedia-team/libebur128","https://github.com/jiixyj/libebur128",3690.6439930556,1,22,0,19,70,0,0,71,2,"2",1.95652173913043,1.98591549295775 +"ejml",-1.6145518294,1.0936860376,-2.2108976925,"https://salsa.debian.org/java-team/libejml-java","https://github.com/lessthanoptimal/ejml",5141.1358564815,14,15,0,17,85,0,0,85,4,"4",1.51724137931034,2 +"p5-encode",0.0933708639,1.2559525686,-0.1937815459,"https://salsa.debian.org/perl-team/modules/packages/libencode-perl","https://github.com/dankogai/p5-encode.git",5752.78,4,51,0,42,88,0,0,90,4,"4",1.92727272727273,1.97777777777778 +"libepoxy",0.3100507455,1.1926379346,0.0363222284,"https://salsa.debian.org/xorg-team/lib/libepoxy","https://github.com/anholt/libepoxy.git",3236.6618981482,11,45,0,45,212,0,0,215,2,"2",1.80357142857143,1.98604651162791 +"liberasurecode",-0.4839675188,1.1970872377,-0.8694804348,"https://salsa.debian.org/openstack-team/libs/liberasurecode","https://github.com/openstack/liberasurecode.git",3370.5594560185,7,23,0,19,7,0,0,26,2,"2",1.76666666666667,1.26923076923077 +"perl-error.pm",1.2535323608,3.335171802,0.4397835194,"https://salsa.debian.org/perl-team/modules/packages/liberror-perl","https://github.com/shlomif/perl-error.pm.git",4521.3125694445,0,3,0,2,3,0,0,4,3,"3",2,1.75 +"libesedb",-0.0038540304,1.3424306865,-0.3777859111,"https://salsa.debian.org/pkg-security-team/libesedb","https://github.com/libyal/libesedb",2793.913912037,0,1,0,1,61,0,2,63,2,"2",2,1.96825396825397 +"libesmtp",0.2677621782,0.8388085609,-0.0156401267,"https://github.com/jbouse-debian/libesmtp","https://github.com/jbouse-debian/libesmtp",4730.7607986111,1,4,0,2,1,0,0,2,3,"3",1.8,1.5 +"libestr",0.2583326289,1.2734255517,0.0106705212,"https://salsa.debian.org/debian/libestr","https://github.com/rsyslog/libestr.git",2916.1839236111,6,7,0,9,8,0,0,13,2,"2",1.53846153846154,1.61538461538462 +"libevent",0.7674583301,1.6743727385,0.314106766,"https://salsa.debian.org/debian/libevent","https://github.com/libevent/libevent",5769.2016435185,214,125,1,240,0,0,6,246,4,"4",1.36873156342183,1 +"libgeotiff",0.3969402517,2.1076539482,-0.0842600623,"https://salsa.debian.org/debian-gis-team/libgeotiff","https://github.com/OSGeo/libgeotiff.git",5753.8535763889,6,17,0,21,54,0,0,58,4,"4",1.73913043478261,1.93103448275862 +"libglvnd",0.3742764654,1.2232824361,0.0505144955,"https://salsa.debian.org/xorg-team/lib/libglvnd.git","https://github.com/NVIDIA/libglvnd.git",3760.105162037,9,47,0,41,117,0,0,133,2,"2",1.83928571428571,1.8796992481203 +"libgroove",-0.5717771357,0.9386669616,-0.9657138035,"https://salsa.debian.org/multimedia-team/libgroove","https://github.com/andrewrk/libgroove",3739.9100810185,3,10,1,10,62,0,2,65,2,"2",1.76923076923077,1.95384615384615 +"hdf4",0.7482393831,1.3419798784,0.3704858112,"https://salsa.debian.org/debian-gis-team/hdf4","https://github.com/HDFGroup/hdf4.git",5770.0810416667,9,27,0,20,22,0,2,34,4,"4",1.75,1.64705882352941 +"libheif",0.7756133995,3.7562106714,0.0328408592,"https://salsa.debian.org/multimedia-team/libheif","https://github.com/strukturag/libheif.git",2185.1827314815,30,67,0,79,121,0,1,182,1,"1",1.69072164948454,1.66483516483516 +"hpptools",-2.8766583863,-0.6777605247,-3.3195064784,"https://salsa.debian.org/med-team/libhpptools","https://github.com/mateidavid/hpptools.git",498.7340625,0,2,0,2,3,0,0,3,1,"1",2,2 +"HTML-Clean",-0.1024783024,1.2552104643,-0.471169751,"https://salsa.debian.org/perl-team/modules/packages/libhtml-clean-perl","https://github.com/poizon/HTML-Clean.git",1155.8983796296,1,3,0,2,2,0,0,2,1,"1",1.75,2 +"p5-html-embedded-turtle",-2.1754143328,0.1122982625,-2.6152678827,"https://salsa.debian.org/perl-team/modules/packages/libhtml-embedded-turtle-perl","https://github.com/tobyink/p5-html-embedded-turtle",1183.7536805556,0,1,0,1,0,0,0,1,1,"1",2,1 +"html-formhandler-model-dbic",-1.4203781466,0.7927422874,-1.859585529,"https://salsa.debian.org/perl-team/modules/packages/libhtml-formhandler-model-dbic-perl","http://github.com/gshank/html-formhandler-model-dbic",1856.3547106482,2,11,0,0,0,0,0,0,1,"1",1.84615384615385,NA +"p5-html-html5-entities",-0.3934618041,1.0242081172,-0.6537250647,"https://salsa.debian.org/perl-team/modules/packages/libhtml-html5-entities-perl","https://github.com/tobyink/p5-html-html5-entities.git",1072.6158333333,0,1,0,1,1,0,0,2,1,"1",2,1.5 +"p5-html-html5-parser",0.8137592838,4.383181915,-0.3515590143,"https://salsa.debian.org/perl-team/modules/packages/libhtml-html5-parser-perl","https://github.com/tobyink/p5-html-html5-parser",4302.9721412037,1,7,0,5,9,0,0,10,3,"3",1.875,1.9 +"libhtp",0.266072694,2.5728754227,-0.5638059217,"https://salsa.debian.org/pkg-suricata-team/pkg-libhtp","https://github.com/OISF/libhtp",5122.0736226852,15,26,2,25,31,0,0,43,4,"4",1.63414634146341,1.72093023255814 +"isa-l",-0.6533940488,1.7011237676,-1.0694298788,"https://salsa.debian.org/openstack-team/third-party/libisal","https://github.com/01org/isa-l.git",2846.4837615741,29,18,0,38,96,0,3,119,2,"2",1.38297872340426,1.80672268907563 +"libjpeg-turbo",0.8208594826,1.6678864112,0.3714003986,"https://salsa.debian.org/debian/libjpeg-turbo/","https://github.com/libjpeg-turbo/libjpeg-turbo",5541.3943171296,44,10,2,41,501,0,0,509,4,"4",1.18518518518519,1.98428290766208 +"p5-JSON-WebToken",-0.1644580581,1.9565513103,-0.5873542729,"https://salsa.debian.org/perl-team/modules/packages/libjson-webtoken-perl","https://github.com/xaicron/p5-JSON-WebToken.git",993.7868981481,0,6,0,2,16,0,0,16,1,"1",2,2 +"p5-kavorka",-1.1158599676,1.8699475451,-1.8919945693,"https://salsa.debian.org/perl-team/modules/packages/libkavorka-perl","https://github.com/tobyink/p5-kavorka",2218.7228703704,0,8,0,5,29,0,0,29,1,"1",2,2 +"p5-latex-table",-0.7020862971,0.7997073577,-0.9848467916,"https://salsa.debian.org/perl-team/modules/packages/liblatex-table-perl","https://github.com/lima1/p5-latex-table.git",556.2399421296,0,2,0,1,0,0,0,1,1,"1",2,1 +"liblbfgs",-0.1459606149,2.0255666612,-0.6194709752,"https://salsa.debian.org/science-team/liblbfgs","https://github.com/chokkan/liblbfgs",5534.0610763889,8,10,0,13,32,0,0,32,4,"4",1.55555555555556,2 +"p5-lexical-underscore",-0.1208593875,2.7968625617,-0.887693709,"https://salsa.debian.org/perl-team/modules/packages/liblexical-underscore-perl","https://github.com/tobyink/p5-lexical-underscore",2933.2191203704,0,1,0,1,4,0,0,4,2,"2",2,2 +"liblognorm",0.9012585102,2.3010415095,0.3051975451,"https://salsa.debian.org/debian/liblognorm","https://github.com/rsyslog/liblognorm.git",4686.8326273148,7,31,0,23,111,0,0,111,3,"3",1.81578947368421,2 +"libmateweather",0.1284830495,0.843121277,-0.0753011191,"https://salsa.debian.org/debian-mate-team/libmateweather","https://github.com/mate-desktop/libmateweather.git",4345.3109837963,19,32,0,32,92,0,0,94,3,"3",1.62745098039216,1.97872340425532 +"libmaxminddb",0.5075375731,2.425458321,-0.014814615,"https://salsa.debian.org/debian/libmaxminddb","https://github.com/maxmind/libmaxminddb",3984.2393634259,21,43,0,49,64,0,0,98,3,"3",1.671875,1.6530612244898 +"method-signatures",-1.1413649114,1.1667964397,-1.6439970781,"https://salsa.debian.org/perl-team/modules/packages/libmethod-signatures-perl","https://github.com/evalEmpire/method-signatures.git",4206.6153935185,3,21,0,18,41,0,1,42,3,"3",1.875,1.97619047619048 +"miglayout",0.0140581375,1.0961315638,-0.2200314501,"https://salsa.debian.org/java-team/libmiglayout-java","https://github.com/mikaelgrev/miglayout",3114.6859375,4,24,0,17,57,0,0,59,2,"2",1.85714285714286,1.96610169491525 +"libminc",-0.2431199399,0.9558742118,-0.5877175902,"https://salsa.debian.org/med-team/libminc","https://github.com/BIC-MNI/libminc.git",5746.5411342593,3,34,0,18,29,0,0,33,4,"4",1.91891891891892,1.87878787878788 +"libmodbus",0.4081348938,2.0101967387,-0.0931762571,"https://salsa.debian.org/debian/libmodbus","https://github.com/stephane/libmodbus.git",5746.5321180556,58,15,0,55,615,0,25,649,4,"4",1.20547945205479,1.94761171032357 +"moosex-compiletime-traits",-1.5653963424,0.9933122892,-2.1997931366,"https://salsa.debian.org/perl-team/modules/packages/libmoosex-compiletime-traits-perl","https://github.com/nperez/moosex-compiletime-traits.git",0.0730787037,0,1,0,0,0,0,0,0,1,"1",2,NA +"MooseX-MultiInitArg",-1.070754038,1.0835902153,-1.5042988332,"https://salsa.debian.org/perl-team/modules/packages/libmoosex-multiinitarg-perl","https://github.com/frodwith/MooseX-MultiInitArg.git",0.0628703704,0,1,0,1,0,0,0,1,1,"1",2,1 +"p5-moosex-mungehas",-1.7054687669,0.6551084355,-2.1489172119,"https://salsa.debian.org/perl-team/modules/packages/libmoosex-mungehas-perl","https://github.com/tobyink/p5-moosex-mungehas",2044.5397800926,1,6,0,4,6,0,0,6,1,"1",1.85714285714286,2 +"MooseX-Runnable",-1.5770222755,1.133906618,-2.3498416952,"https://salsa.debian.org/perl-team/modules/packages/libmoosex-runnable-perl","https://github.com/moose/MooseX-Runnable",3541.9794097222,1,4,0,4,4,0,0,6,2,"2",1.8,1.66666666666667 +"p5-moosex-xsaccessor",-1.7969930844,0.6221995894,-2.237446435,"https://salsa.debian.org/perl-team/modules/packages/libmoosex-xsaccessor-perl","https://github.com/tobyink/p5-moosex-xsaccessor",3461.6608333333,0,1,0,1,1,0,0,2,2,"2",2,1.5 +"p5-moox-cmd",-1.7714724432,0.7389635101,-2.3287224021,"https://salsa.debian.org/perl-team/modules/packages/libmoox-cmd-perl","https://github.com/Getty/p5-moox-cmd",2141.9085532407,4,4,0,7,9,0,0,11,1,"1",1.5,1.81818181818182 +"p5-moox-struct",1.100399874,4.7268638235,0.0231138942,"https://salsa.debian.org/perl-team/modules/packages/libmoox-struct-perl","https://github.com/tobyink/p5-moox-struct",3679.9237037037,1,2,0,2,4,0,0,4,2,"2",1.66666666666667,2 +"MooX-Types-MooseLike",0.2188487287,2.4276236186,-0.2341829878,"https://salsa.debian.org/perl-team/modules/packages/libmoox-types-mooselike-perl","https://github.com/mateu/MooX-Types-MooseLike.git",1382.0588888889,0,16,0,12,20,0,0,21,1,"1",2,1.95238095238095 +"p5-MouseX-NativeTraits",0.451797092,3.5585079183,-0.2632252957,"https://salsa.debian.org/perl-team/modules/packages/libmousex-nativetraits-perl","https://github.com/gfx/p5-MouseX-NativeTraits.git",1010.1283101852,1,4,0,2,2,0,0,4,1,"1",1.8,1.5 +"p5-mousex-types",-0.9002059228,2.4281097906,-1.6194395424,"https://salsa.debian.org/perl-team/modules/packages/libmousex-types-perl","https://github.com/yappo/p5-mousex-types.git",984.7711226852,0,8,0,2,5,0,0,7,1,"1",2,1.71428571428571 +"libmpdclient",0.2085560362,1.356457434,-0.1176167234,"https://salsa.debian.org/mpd-team/libmpdclient","https://github.com/MusicPlayerDaemon/libmpdclient",5726.394375,18,26,0,31,41,0,0,60,4,"4",1.59090909090909,1.68333333333333 +"libofx",0.2034150256,0.6532722257,-0.0343613081,"https://salsa.debian.org/debian/libofx","https://github.com/libofx/libofx",5174.00625,8,16,0,16,48,0,0,49,4,"4",1.66666666666667,1.97959183673469 +"OpenHMD",0.1127945014,1.854847445,-0.28253551,"https://salsa.debian.org/debian/libopenhmd","https://github.com/OpenHMD/OpenHMD",3515.7873958333,18,41,1,36,258,0,18,277,2,"2",1.69491525423729,1.93140794223827 +"Pandoc-Elements",-1.2178305762,1.3066890827,-1.790496828,"https://salsa.debian.org/perl-team/modules/packages/libpandoc-elements-perl","https://github.com/nichtich/Pandoc-Elements.git",2600.5557175926,2,3,0,3,9,0,2,12,1,"1",1.6,1.75 +"Pandoc-Wrapper",-1.1913578813,0.8972995069,-1.7262399697,"https://salsa.debian.org/perl-team/modules/packages/libpandoc-wrapper-perl","https://github.com/nichtich/Pandoc-Wrapper.git",1879.2412037037,2,4,0,5,16,0,0,17,1,"1",1.66666666666667,1.94117647058824 +"params-callbackrequest",-1.3155087057,0.9970633758,-1.7603650909,"https://salsa.debian.org/perl-team/modules/packages/libparams-callbackrequest-perl","https://github.com/theory/params-callbackrequest.git",1199.2313657407,0,2,0,1,0,0,0,1,1,"1",2,1 +"Params-Util",0.5669557248,2.7095409025,0.0183304165,"https://salsa.debian.org/perl-team/modules/packages/libparams-util-perl","https://github.com/perl5-utils/Params-Util",4635.8917939815,2,6,0,2,5,0,0,5,3,"3",1.75,2 +"parse-cpan-packages",-1.3162623238,0.055729798,-1.5930972954,"https://salsa.debian.org/perl-team/modules/packages/libparse-cpan-packages-perl","https://github.com/wchristian/parse-cpan-packages",2213.1126273148,1,3,0,4,6,0,0,8,1,"1",1.75,1.75 +"Parse-Method-Signatures",-0.3098675421,2.1520892101,-0.7857930491,"https://salsa.debian.org/perl-team/modules/packages/libparse-method-signatures-perl","https://github.com/ashb/Parse-Method-Signatures.git",3028.8479166667,2,10,0,8,5,0,0,10,2,"2",1.83333333333333,1.5 +"perl-Parse-Netstat",-1.2901506305,0.9707747961,-1.7179336241,"https://salsa.debian.org/perl-team/modules/packages/libparse-netstat-perl","https://github.com/perlancar/perl-Parse-Netstat.git",4083.673275463,0,11,0,2,0,0,0,2,3,"3",2,1 +"Parse-RecDescent",-0.0286467306,0.2229895206,-0.1007582655,"https://salsa.debian.org/perl-team/modules/packages/libparse-recdescent-perl","https://github.com/jtbraun/Parse-RecDescent.git",2082.3553240741,1,5,0,2,7,0,0,7,1,"1",1.83333333333333,2 +"perl-pdf-report",-1.1407475711,-0.7317783117,-1.2346814292,"https://salsa.debian.org/perl-team/modules/packages/libpdf-report-perl","https://github.com/hashbangperl/perl-pdf-report.git",159.7184490741,0,1,0,1,2,0,0,2,1,"1",2,2 +"PDL-IO-Matlab",-1.8122896746,0.3558570995,-2.2370761422,"https://salsa.debian.org/perl-team/modules/packages/libpdl-io-matlab-perl","https://github.com/jlapeyre/PDL-IO-Matlab.git",3358.4244907408,1,2,0,2,4,0,0,4,2,"2",1.66666666666667,2 +"perl-Perinci-Sub-Normalize",-2.9327731106,-0.9162267093,-3.3201523401,"https://salsa.debian.org/perl-team/modules/packages/libperinci-sub-normalize-perl","https://github.com/perlancar/perl-Perinci-Sub-Normalize.git",3147.5333564815,0,11,0,2,0,0,0,2,2,"2",2,1 +"p5-perlx-assert",-1.0193446605,1.5425032533,-1.8362395319,"https://salsa.debian.org/perl-team/modules/packages/libperlx-assert-perl","https://github.com/tobyink/p5-perlx-assert",1111.6440162037,0,1,0,1,1,0,0,1,1,"1",2,2 +"p5-perlx-define",-2.1678337344,0.0459215725,-2.6131874891,"https://salsa.debian.org/perl-team/modules/packages/libperlx-define-perl","https://github.com/tobyink/p5-perlx-define",0.0109259259,0,1,0,1,1,0,0,1,1,"1",2,2 +"libplist",0.2890151668,0.7751330361,0.068106781,"https://salsa.debian.org/imobiledevice-team/libplist","https://github.com/libimobiledevice/libplist.git",5614.0678125,41,20,0,42,98,0,0,127,4,"4",1.32786885245902,1.77165354330709 +"libpng",0.1677990695,0.4257948453,0.0473446327,"https://salsa.debian.org/debian/libpng1.6","https://github.com/glennrp/libpng",5354.1097106482,66,26,0,71,29,0,1,92,4,"4",1.28260869565217,1.31521739130435 +"quazip",0.2146838323,0.9284953049,-0.0650262981,"https://salsa.debian.org/debian/libquazip","https://github.com/stachenov/quazip.git",5295.4944097222,19,25,0,36,147,0,0,150,4,"4",1.56818181818182,1.98 +"rabbitmq-c",0.5937450624,2.3238703606,-0.0094513193,"https://salsa.debian.org/debian/librabbitmq","https://github.com/alanxz/rabbitmq-c.git",5294.5360185185,63,49,0,77,513,0,0,520,4,"4",1.4375,1.98653846153846 +"librarian-puppet",-1.4485786469,-0.1256063685,-1.863254572,"https://salsa.debian.org/ruby-team/librarian-puppet","https://github.com/voxpupuli/librarian-puppet.git",4114.1364930556,12,65,0,51,102,0,0,135,3,"3",1.84415584415584,1.75555555555556 +"p5-rdf-trinex-functions",-0.3154319143,2.3378879966,-0.9704018341,"https://salsa.debian.org/perl-team/modules/packages/librdf-trinex-functions-perl","https://github.com/tobyink/p5-rdf-trinex-functions",833.4788657407,0,1,0,1,0,0,0,1,1,"1",2,1 +"p5-rdf-vcard",-1.1506651259,1.2441236911,-1.5912534228,"https://salsa.debian.org/perl-team/modules/packages/librdf-vcard-perl","https://github.com/tobyink/p5-rdf-vcard",1350.944537037,0,1,0,1,3,0,0,3,1,"1",2,2 +"re-engine-RE2",0.0664274847,1.5519335001,-0.198667675,"https://salsa.debian.org/perl-team/modules/packages/libre-engine-re2-perl","https://github.com/dgl/re-engine-RE2.git",4711.6157638889,4,2,0,5,11,0,0,11,3,"3",1.33333333333333,2 +"Regexp-Assemble",0.1956519681,1.1975556345,-0.0657051088,"https://salsa.debian.org/perl-team/modules/packages/libregexp-assemble-perl","https://github.com/ronsavage/Regexp-Assemble.git",3022.0175347222,1,7,0,6,10,0,0,10,2,"2",1.875,2 +"Regexp--Common",0.425402964,2.6846898207,-0.0434398169,"https://salsa.debian.org/perl-team/modules/packages/libregexp-common-perl","https://github.com/Abigail/Regexp--Common.git",2712.1816087963,4,1,0,3,10,0,0,12,1,"1",1.2,1.83333333333333 +"libregf",0.4815110403,3.4273810655,-0.3192521911,"https://salsa.debian.org/pkg-security-team/libregf","https://github.com/libyal/libregf",3351.514375,0,1,0,1,10,0,2,12,2,"2",2,1.83333333333333 +"librelp",0.3314612484,2.0471916806,-0.1848777948,"https://salsa.debian.org/debian/librelp","https://github.com/rsyslog/librelp",5591.5436921296,9,32,1,25,70,0,0,74,4,"4",1.78048780487805,1.94594594594595 +"libreswan",-0.4685289799,0.1790588169,-0.7335988012,"https://salsa.debian.org/debian/libreswan","https://github.com/libreswan/libreswan.git",5780.1473263889,145,62,0,96,291,0,0,336,4,"4",1.29951690821256,1.86607142857143 +"rose",-0.5901790776,0.7613087197,-0.8838877593,"https://salsa.debian.org/perl-team/modules/packages/librose-db-object-perl","https://github.com/siracusa/rose.git",5666.5254166667,1,13,0,5,15,0,1,16,4,"4",1.92857142857143,1.9375 +"librsync",1.0536449912,2.2531278593,0.4172888316,"https://salsa.debian.org/wrar/librsync","https://github.com/librsync/librsync",3224.9778472222,6,27,0,28,97,0,0,99,2,"2",1.81818181818182,1.97979797979798 +"libsamplerate",1.1293768908,2.270076752,0.5189548422,"https://salsa.debian.org/multimedia-team/libsamplerate","https://github.com/libsndfile/libsamplerate",5747.2226851852,38,5,1,34,55,0,0,67,4,"4",1.11627906976744,1.82089552238806 +"libsass-python",-0.2696522517,0.8271709552,-0.6027229138,"https://salsa.debian.org/debian/libsass-python","https://github.com/dahlia/libsass-python.git",4268.9750925926,7,93,0,77,129,0,0,180,3,"3",1.93,1.71666666666667 +"libseccomp",0.1381369347,0.416274215,0.0228352343,"https://salsa.debian.org/debian/libseccomp","https://github.com/seccomp/libseccomp",4323.2139467593,71,4,2,57,206,0,1,215,3,"3",1.05333333333333,1.95813953488372 +"libserial",-1.1010178283,1.6867209629,-1.6981926712,"https://salsa.debian.org/debian/libserial","https://github.com/crayzeewulf/libserial.git",5587.6811226852,3,17,0,12,68,0,2,71,4,"4",1.85,1.95774647887324 +"libsigcplusplus",1.039682316,2.0456143837,0.5117249183,"https://salsa.debian.org/gnome-team/libsigcplusplus","https://github.com/libsigcplusplus/libsigcplusplus.git",5770.9372800926,22,19,0,30,50,0,0,65,4,"4",1.46341463414634,1.76923076923077 +"smali",0.051369828,1.8568435409,-0.3306485602,"https://salsa.debian.org/android-tools-team/libsmali-java","https://github.com/JesusFreke/smali",4709.8444212963,28,24,0,34,365,0,10,381,3,"3",1.46153846153846,1.95800524934383 +"libsoundio",0.7102350676,3.6650448533,-0.2050801471,"https://salsa.debian.org/debian-hamradio-team/libsoundio","https://github.com/andrewrk/libsoundio.git",3080.119837963,16,23,0,26,120,0,4,127,2,"2",1.58974358974359,1.94488188976378 +"libspiro",0.131579132,1.3992780483,-0.1906866674,"https://salsa.debian.org/fonts-team/libspiro","https://github.com/fontforge/libspiro.git",4925.1799537037,1,10,0,7,21,0,0,21,3,"3",1.90909090909091,2 +"spreadsheet-parseexcel",0.0390044504,0.8094712372,-0.1827268471,"https://salsa.debian.org/perl-team/modules/packages/libspreadsheet-parseexcel-perl","https://github.com/runrig/spreadsheet-parseexcel.git",1902.0376851852,1,6,0,6,33,0,0,36,1,"1",1.85714285714286,1.91666666666667 +"spreadsheet-writeexcel",-0.0847103732,0.3100125622,-0.1871342632,"https://salsa.debian.org/perl-team/modules/packages/libspreadsheet-writeexcel-perl","https://github.com/jmcnamara/spreadsheet-writeexcel",5025.7453819445,1,5,0,5,0,0,1,6,4,"4",1.83333333333333,1 +"libssh2",0.4762440748,1.2465942901,0.1442247779,"https://salsa.debian.org/debian/libssh2","https://github.com/libssh2/libssh2",5758.7769328704,166,33,1,147,60,0,1,189,4,"4",1.16582914572864,1.31746031746032 +"libStatGen",-0.975335451,0.4820429389,-1.3209080132,"https://salsa.debian.org/med-team/libstatgen","https://github.com/statgen/libStatGen",3791.9891319445,4,17,0,10,34,0,0,36,3,"3",1.80952380952381,1.94444444444444 +"statistics--basic",-0.339509548,1.3960758717,-0.6303620815,"https://salsa.debian.org/perl-team/modules/packages/libstatistics-basic-perl","https://github.com/jettero/statistics--basic",2331.8967939815,1,4,0,2,4,0,0,5,1,"1",1.8,1.8 +"stb",0.0260953725,0.614834907,-0.1332118971,"https://salsa.debian.org/yangfl-guest/stb","https://github.com/nothings/stb",3489.7656944445,45,185,0,183,533,0,0,592,2,"2",1.80434782608696,1.90033783783784 +"p5-String-Diff",-1.3455951871,1.0906833724,-1.8998963909,"https://salsa.debian.org/perl-team/modules/packages/libstring-diff-perl","https://github.com/yappo/p5-String-Diff.git",2495.2807060185,0,3,0,2,16,0,0,16,1,"1",2,2 +"string-mkpasswd",-0.4901797022,1.4058339509,-0.8573438246,"https://salsa.debian.org/perl-team/modules/packages/libstring-mkpasswd-perl","https://github.com/sirhc/string-mkpasswd.git",1997.6768055556,0,4,0,2,7,0,0,7,1,"1",2,2 +"Switch",1.122027291,3.2876087875,0.2909942207,"https://salsa.debian.org/perl-team/modules/packages/libswitch-perl","https://github.com/chorny/Switch.git",4065.2442592593,3,4,0,4,3,0,0,6,3,"3",1.57142857142857,1.5 +"Sys-Filesystem",-1.1120417075,0.3703683235,-1.5493480129,"https://salsa.debian.org/perl-team/modules/packages/libsys-filesystem-perl","https://github.com/rehsack/Sys-Filesystem",4021.0829050926,2,3,0,2,3,0,0,3,3,"3",1.6,2 +"CPAN-Sys-Info-Base",-1.1657354635,0.2469375973,-1.4547896136,"https://salsa.debian.org/perl-team/modules/packages/libsys-info-base-perl","https://github.com/burak/CPAN-Sys-Info-Base.git",4472.8146643519,0,2,0,1,2,0,0,2,3,"3",2,2 +"tabixpp",-0.5609418279,1.5681864899,-0.9903141087,"https://salsa.debian.org/med-team/libtabixpp","https://github.com/ekg/tabixpp.git",4263.7660069445,1,12,0,9,27,0,0,27,3,"3",1.92307692307692,2 +"libteam",0.3146115396,1.3119743537,0.0101461881,"https://salsa.debian.org/debian/libteam","https://github.com/jpirko/libteam",4358.8268634259,40,5,0,31,78,0,3,102,3,"3",1.11111111111111,1.76470588235294 +"TermReadKey",0.6441757313,1.6725134495,0.1757431378,"https://salsa.debian.org/perl-team/modules/packages/libterm-readkey-perl","https://github.com/jonathanstowe/TermReadKey.git",4734.9570717593,8,17,0,18,40,0,0,42,3,"3",1.68,1.95238095238095 +"Term-Table",-0.9505327372,1.4037764096,-1.390637121,"https://salsa.debian.org/perl-team/modules/packages/libterm-table-perl","https://github.com/exodist/Term-Table.git",2498.9135185185,1,5,0,5,16,0,0,16,1,"1",1.83333333333333,2 +"Test-Harness",-1.5063742807,-0.2541479391,-1.8715013961,"https://salsa.debian.org/perl-team/modules/packages/libtest-harness-perl","https://github.com/Perl-Toolchain-Gang/Test-Harness.git",5734.1103356482,27,47,0,51,97,0,2,113,4,"4",1.63513513513514,1.85840707964602 +"URI",0.1589529919,0.4832194601,0.0298109637,"https://salsa.debian.org/perl-team/modules/packages/liburi-perl","https://github.com/libwww-perl/URI.git",5620.9042939815,27,14,0,37,89,0,1,98,4,"4",1.34146341463415,1.90816326530612 +"libusbmuxd",0.7289206284,2.7086807014,0.1072945241,"https://salsa.debian.org/imobiledevice-team/libusbmuxd","https://github.com/libimobiledevice/libusbmuxd.git",3636.013275463,9,9,0,14,171,0,0,173,2,"2",1.5,1.98843930635838 +"libvslvm",0.4972132182,3.5752748687,-0.3065187033,"https://salsa.debian.org/pkg-security-team/libvslvm","https://github.com/libyal/libvslvm",3338.937025463,0,1,0,1,10,0,2,12,2,"2",2,1.83333333333333 +"p5-web-id",-1.7090564746,0.8941936847,-2.3119612886,"https://salsa.debian.org/perl-team/modules/packages/libweb-id-perl","https://github.com/tobyink/p5-web-id",743.3495023148,0,1,0,1,1,0,0,1,1,"1",2,2 +"libwfut",-0.3722932827,1.182465359,-1.0373316516,"https://salsa.debian.org/games-team/libwfut","https://github.com/worldforge/libwfut",5568.6978240741,0,9,0,6,3,0,0,6,4,"4",2,1.5 +"libwmf",1.6375319104,2.6900330531,0.986051197,"https://salsa.debian.org/yangfl-guest/libwmf","https://github.com/caolanm/libwmf",1783.8275231482,5,6,0,8,12,0,0,14,1,"1",1.54545454545455,1.85714285714286 +"perl-wfa",-1.3338913453,0.3424607166,-1.6281493484,"https://salsa.debian.org/perl-team/modules/packages/libwww-facebook-api-perl","https://github.com/unobe/perl-wfa.git",3078.4910185185,2,7,0,4,7,0,0,8,2,"2",1.77777777777778,1.875 +"p5-www-finger",-1.969235679,0.3956899207,-2.5687445665,"https://salsa.debian.org/perl-team/modules/packages/libwww-finger-perl","https://github.com/tobyink/p5-www-finger",1316.1418171296,0,1,0,1,0,0,0,1,1,"1",2,1 +"www-google-calculator-perl",-1.995767031,-0.963482599,-2.1565335627,"https://salsa.debian.org/perl-team/modules/packages/libwww-google-calculator-perl","https://github.com/typester/www-google-calculator-perl.git",8.9802893519,0,2,0,1,1,0,0,2,1,"1",2,1.5 +"libx86emu",0.2882621713,2.1510294765,-0.1187700994,"https://salsa.debian.org/debian/libx86emu","https://github.com/wfeldt/libx86emu",5028.2515972222,1,8,0,5,16,0,1,17,4,"4",1.88888888888889,1.94117647058824 +"libxcrypt",0.6294336301,1.8917972899,0.1100717419,"https://salsa.debian.org/md/libxcrypt","https://github.com/besser82/libxcrypt.git",2976.0054050926,9,14,0,21,95,0,0,97,2,"2",1.60869565217391,1.97938144329897 +"libxmlb",0.6508495345,3.3286264453,-0.0130638591,"https://salsa.debian.org/efi-team/libxmlb","https://github.com/hughsie/libxmlb.git",1900.0449074074,20,6,0,18,36,0,0,36,1,"1",1.23076923076923,2 +"libxsmm",-0.2346624326,4.5583780245,-1.7957714951,"https://salsa.debian.org/science-team/libxsmm","https://github.com/libxsmm/libxsmm",2814.5005324074,23,91,3,47,120,0,3,130,2,"2",1.79824561403509,1.92307692307692 +"xstream",0.3400487245,1.4508992999,-0.0600865184,"https://salsa.debian.org/java-team/libxstream-java","https://github.com/x-stream/xstream.git",5706.9961921296,29,7,0,35,375,0,0,383,4,"4",1.19444444444444,1.97911227154047 +"light",0.5032985546,2.4196884631,-0.3115474994,"https://salsa.debian.org/debian/light","https://github.com/haikarainen/light.git",3160.1600115741,4,28,0,25,51,0,0,66,2,"2",1.875,1.77272727272727 +"light-locker",2.0302690876,3.664096529,1.142878255,"https://salsa.debian.org/xfce-extras-team/light-locker","https://github.com/the-cavalry/light-locker",4227.1496643519,82,214,2,128,275,0,0,390,3,"3",1.72297297297297,1.7051282051282 +"lightdm",2.2443975037,2.9446010571,1.7397776964,"https://salsa.debian.org/xfce-extras-team/lightdm","https://github.com/canonical/lightdm.git",4834.5447222222,52,64,0,73,415,0,0,449,3,"3",1.55172413793103,1.92427616926503 +"linux-minidisc",-0.9631872604,1.8387133413,-1.6378120208,"https://github.com/glaubitz/linux-minidisc","https://github.com/glaubitz/linux-minidisc",4847.712349537,36,17,0,20,3,0,0,23,3,"3",1.32075471698113,1.1304347826087 +"linux_logo",3.6168427209,4.8502382947,2.8124057325,"https://salsa.debian.org/debian/linuxlogo","https://github.com/deater/linux_logo.git",3761.5540393519,1,11,0,8,26,0,0,26,2,"2",1.91666666666667,2 +"LiTL",-1.9126650133,-1.5671586884,-1.990034954,"https://salsa.debian.org/debian/litl","https://github.com/trahay/LiTL.git",3099.0093171296,0,7,0,3,1,0,0,3,2,"2",2,1.33333333333333 +"lksctp-tools",0.0452198518,0.3695750173,-0.0618537574,"https://salsa.debian.org/debian/lksctp-tools","https://github.com/sctp/lksctp-tools",5515.8208912037,27,6,1,22,37,0,1,51,4,"4",1.18181818181818,1.72549019607843 +"llgal",-0.3872692626,0.4151216759,-0.6843175914,"https://github.com/bgoglin/llgal","https://github.com/bgoglin/llgal",4534.9444212963,2,4,0,1,11,0,0,11,3,"3",1.66666666666667,2 +"lltag",0.046755981,1.4904215665,-0.4505269549,"https://github.com/bgoglin/lltag","https://github.com/bgoglin/lltag",4379.0269328704,3,3,0,2,9,0,0,9,3,"3",1.5,2 +"lmodern",0.1884866384,0.5510456421,0.0188158223,"https://github.com/debian-tex/lmodern","https://github.com/debian-tex/lmodern",5129.2031828704,1,7,0,2,1,0,0,3,4,"4",1.875,1.33333333333333 +"lnav",0.5353667256,1.9342081999,-0.0323395042,"https://salsa.debian.org/carnil/lnav","https://github.com/tstack/lnav",5194.1560648148,17,59,0,51,384,0,4,404,4,"4",1.77631578947368,1.95049504950495 +"logging-log4cxx",0.4346363558,1.6002502027,-0.0917843487,"https://salsa.debian.org/debian/log4cxx","https://github.com/apache/logging-log4cxx.git",3632.7022222222,22,27,0,28,7,0,0,31,2,"2",1.55102040816327,1.2258064516129 +"logbook",-0.4896324695,1.3303979826,-1.0513067414,"https://salsa.debian.org/debian/logbook","https://github.com/getlogbook/logbook.git",4893.8917824074,11,77,0,65,189,0,0,192,3,"3",1.875,1.984375 +"logging_tree",-1.6414264559,0.7777898237,-2.2813478865,"https://salsa.debian.org/debian/python-logging-tree","https://github.com/brandon-rhodes/logging_tree.git",3349.1260532407,5,7,0,10,25,0,0,25,2,"2",1.58333333333333,2 +"redis-lua",-0.3995562839,2.3401321656,-1.0679040964,"https://salsa.debian.org/lua-team/lua-redis","https://github.com/nrk/redis-lua",2064.0116898148,2,10,0,8,80,0,0,80,1,"1",1.83333333333333,2 +"lxctl",1.456465586,5.0051312044,0.180488606,"https://salsa.debian.org/debian/lxctl","https://github.com/lxctl/lxctl",2540.4811342593,0,29,1,12,21,0,5,28,1,"1",2,1.75 +"lxde-icon-theme",0.3420036946,2.5520871,-0.0935522829,"https://salsa.debian.org/lxde-team/lxde-icon-theme","https://github.com/lxde/lxde-icon-theme",1739.474375,0,4,0,3,0,0,0,3,1,"1",2,1 +"lxhotkey",1.1410291912,4.8144910554,0.0876782474,"https://salsa.debian.org/lxde-team/lxhotkey","https://github.com/lxde/lxhotkey.git",2759.3632291667,8,4,0,8,27,0,0,32,2,"2",1.33333333333333,1.84375 +"lxinput",0.7555106667,3.0338681034,0.062981082,"https://salsa.debian.org/lxde-team/lxinput","https://github.com/lxde/lxinput.git",5254.8770717593,78,26,0,55,0,0,0,55,4,"4",1.25,1 +"lxqt-globalkeys",0.2347991986,1.8204555607,-0.1421664419,"https://salsa.debian.org/lxqt-team/lxqt-globalkeys","https://github.com/lxqt/lxqt-globalkeys.git",4146.0372916667,56,46,0,78,0,0,0,78,3,"3",1.45098039215686,1 +"lxqt-openssh-askpass",0.2639701586,2.0558849821,-0.1403263445,"https://salsa.debian.org/lxqt-team/lxqt-openssh-askpass","https://github.com/lxqt/lxqt-openssh-askpass.git",4154.121712963,34,30,0,50,29,0,0,59,3,"3",1.46875,1.49152542372881 +"lz4",0.2140600439,0.6954425453,0.0384684269,"https://salsa.debian.org/debian/lz4","https://github.com/lz4/lz4",3549.3137037037,30,172,0,147,393,0,5,456,2,"2",1.85148514851485,1.86184210526316 +"mako",0.9607195824,2.3152903989,0.3300125847,"https://salsa.debian.org/python-team/packages/mako","https://github.com/sqlalchemy/mako",5744.8817476852,23,45,7,53,64,0,6,98,4,"4",1.66176470588235,1.6530612244898 +"variant",0.159782488,3.7315023577,-0.6830233266,"https://salsa.debian.org/debian-gis-team/mapbox-variant/","https://github.com/mapbox/variant.git",2484.9211689815,4,25,0,18,52,0,1,55,1,"1",1.86206896551724,1.94545454545455 +"mapcache",-0.6849497052,1.4775793478,-1.119704947,"https://salsa.debian.org/debian-gis-team/mapcache","https://github.com/mapserver/mapcache.git",4429.8413773148,24,38,0,33,160,0,2,163,3,"3",1.61290322580645,1.98159509202454 +"mate-common",0.2236781765,1.5441453615,-0.2936941102,"https://salsa.debian.org/debian-mate-team/mate-common","https://github.com/mate-desktop/mate-common.git",4289.5348032407,4,19,0,14,26,0,0,28,3,"3",1.82608695652174,1.92857142857143 +"mate-control-center",0.442807422,1.1267913622,0.085872745,"https://salsa.debian.org/debian-mate-team/mate-control-center","https://github.com/mate-desktop/mate-control-center.git",4382.2688194445,31,51,0,48,319,0,0,321,3,"3",1.6219512195122,1.99376947040498 +"mate-desktop",1.4429678874,2.800379976,0.7048624548,"https://salsa.debian.org/debian-mate-team/mate-desktop","https://github.com/mate-desktop/mate-desktop.git",4339.3214814815,30,45,0,44,57,0,0,90,3,"3",1.6,1.63333333333333 +"dock-applet",0.3881982435,2.2401761238,-0.1688322569,"https://salsa.debian.org/debian-mate-team/mate-dock-applet","https://github.com/robint99/dock-applet.git",2711.5333680556,9,12,0,13,168,0,0,169,1,"1",1.57142857142857,1.99408284023669 +"mate-icon-theme",0.4087889597,2.4988457726,-0.055212655,"https://salsa.debian.org/debian-mate-team/mate-icon-theme","https://github.com/mate-desktop/mate-icon-theme.git",3997.7458217593,7,25,0,19,36,0,0,38,3,"3",1.78125,1.94736842105263 +"mate-icon-theme-faenza",0.5142431191,2.3829279771,-0.0287099151,"https://salsa.debian.org/debian-mate-team/mate-icon-theme-faenza","https://github.com/mate-desktop/mate-icon-theme-faenza.git",2081.9641898148,2,15,0,10,19,0,0,20,1,"1",1.88235294117647,1.95 +"mate-netbook",-0.1990739498,0.92545311,-0.5547977915,"https://salsa.debian.org/debian-mate-team/mate-netbook","https://github.com/mate-desktop/mate-netbook.git",4033.4643981482,4,20,0,14,35,0,0,37,3,"3",1.83333333333333,1.94594594594595 +"mate-notification-daemon",0.294431484,1.2443680719,-0.0375475363,"https://salsa.debian.org/debian-mate-team/mate-notification-daemon","https://github.com/mate-desktop/mate-notification-daemon.git",4376.8075462963,19,34,0,34,136,0,0,140,3,"3",1.64150943396226,1.97142857142857 +"mate-polkit",0.0844204987,0.7139928108,-0.078912062,"https://salsa.debian.org/debian-mate-team/mate-polkit","https://github.com/mate-desktop/mate-polkit.git",4293.1045717593,9,23,0,18,42,0,0,47,3,"3",1.71875,1.8936170212766 +"mate-settings-daemon",0.1815646983,0.7203109893,-0.0328315734,"https://salsa.debian.org/debian-mate-team/mate-settings-daemon","https://github.com/mate-desktop/mate-settings-daemon.git",4342.2338425926,28,45,0,46,189,0,0,200,3,"3",1.61643835616438,1.945 +"selinux",-1.9181882041,-0.1416609992,-2.339014847,"https://salsa.debian.org/selinux-team/mcstrans","https://github.com/SELinuxProject/selinux.git",5593.8026157407,179,30,0,124,83,0,12,182,4,"4",1.14354066985646,1.45604395604396 +"mdbtools",0.6161871039,1.1807658317,0.2302864182,"https://salsa.debian.org/debian/mdbtools","https://github.com/mdbtools/mdbtools",4863.4037152778,30,60,0,60,195,0,0,220,3,"3",1.66666666666667,1.88636363636364 +"mdk4",-0.0590321422,2.244566977,-0.6808566672,"https://salsa.debian.org/pkg-security-team/mdk4","https://github.com/aircrack-ng/mdk4",1545.4045949074,4,9,0,11,96,0,0,97,1,"1",1.69230769230769,1.98969072164948 +"metapixel",1.7970234478,4.4178259899,0.5633223634,"https://salsa.debian.org/debian/metapixel","https://github.com/schani/metapixel.git",3264.7618171296,2,6,0,4,25,0,0,25,2,"2",1.75,2 +"metastore",-0.4597261727,0.6466323956,-0.8107792072,"https://salsa.debian.org/rfrancoise/metastore","https://github.com/przemoc/metastore",5431.9336689815,7,2,1,8,30,0,2,33,4,"4",1.22222222222222,1.90909090909091 +"meteo-qt",0.8698899777,3.6161721459,0.0040074202,"https://salsa.debian.org/lxqt-team/meteo-qt","https://github.com/dglent/meteo-qt.git",3275.9305092593,3,17,0,16,53,0,0,53,2,"2",1.85,2 +"Mew",-0.487761537,-0.3514010061,-0.554001036,"https://salsa.debian.org/debian/mew","https://github.com/kazu-yamamoto/Mew",5007.0253703704,7,24,0,25,45,0,0,46,4,"4",1.7741935483871,1.97826086956522 +"Mew",-0.8388830323,-0.1260459264,-1.0270915103,"https://salsa.debian.org/debian/mew-beta","https://github.com/kazu-yamamoto/Mew",5007.0253703704,7,24,0,25,45,0,0,46,4,"4",1.7741935483871,1.97826086956522 +"mg",0.8626842283,2.0640170714,0.2148718944,"https://salsa.debian.org/debian/mg","https://github.com/hboetes/mg.git",2838.9768518519,3,9,0,3,25,0,0,25,2,"2",1.75,2 +"mhc",-0.8884000458,-0.3595274014,-1.157500378,"https://salsa.debian.org/debian/mhc","https://github.com/yoshinari-nomura/mhc",4808.1619907407,0,12,0,8,12,0,0,12,3,"3",2,2 +"mhwaveedit",-0.0845847669,0.9517864727,-0.4200690155,"https://salsa.debian.org/multimedia-team/mhwaveedit","https://github.com/magnush/mhwaveedit",4171.9324305556,3,7,0,6,15,0,0,16,3,"3",1.7,1.9375 +"micro-httpd",-0.3300074474,1.1160734611,-0.9308283084,"https://github.com/sudipm-mukherjee/micro-httpd.git","https://github.com/sudipm-mukherjee/micro-httpd.git",4120.3943287037,0,4,0,1,1,0,0,2,3,"3",2,1.5 +"MilkyTracker",0.2927952476,1.359126964,-0.1661437741,"https://salsa.debian.org/multimedia-team/milkytracker","https://github.com/milkytracker/MilkyTracker",5764.1453472222,35,32,1,44,68,0,5,92,4,"4",1.47761194029851,1.73913043478261 +"miller",-0.6485962999,1.145337313,-1.0224618063,"https://salsa.debian.org/debian/miller","https://github.com/johnkerl/miller.git",3146.11875,32,28,0,52,128,0,1,155,2,"2",1.46666666666667,1.8258064516129 +"mimetic",-1.0569767141,-0.8952643698,-1.0963723389,"https://git.toastfreeware.priv.at/debian/mimetic.git","https://github.com/tat/mimetic.git",2612.777962963,3,10,0,8,26,0,0,26,1,"1",1.76923076923077,2 +"Minder",-0.4197168251,2.1005562235,-0.9632919414,"https://salsa.debian.org/yangfl-guest/Minder","https://github.com/phase1geo/Minder.git",2148.0431712963,20,27,0,36,96,0,1,112,1,"1",1.57446808510638,1.85714285714286 +"minimodem",-0.3250415773,2.1360118932,-0.8562976169,"https://github.com/kamalmostafa/minimodem","https://github.com/kamalmostafa/minimodem",3742.1687037037,10,6,0,12,71,0,0,76,2,"2",1.375,1.93421052631579 +"mininet",-0.586251107,1.2693023429,-1.2259353746,"https://salsa.debian.org/debian/mininet","https://github.com/mininet/mininet",5029.9877777778,22,77,1,61,58,0,97,202,4,"4",1.77777777777778,1.28712871287129 +"mootools-core",0.7471893128,2.8560605859,0.0458469775,"https://salsa.debian.org/js-team/mootools","https://github.com/mootools/mootools-core.git",2900.1052662037,27,88,0,63,54,0,136,231,2,"2",1.76521739130435,1.23376623376623 +"mopidy-internetarchive",-0.2187337791,2.3088703355,-0.8028100126,"https://salsa.debian.org/mopidy-team/mopidy-internetarchive","https://github.com/tkem/mopidy-internetarchive",2991.6193171296,0,3,1,2,13,0,0,13,2,"2",2,2 +"mopidy-mpris",-0.2110446145,2.461940178,-1.1114345149,"https://salsa.debian.org/mopidy-team/mopidy-mpris","https://github.com/mopidy/mopidy-mpris.git",3543.9779050926,2,7,0,6,34,0,0,35,2,"2",1.77777777777778,1.97142857142857 +"mopidy-podcast",-0.2941570726,1.7690171184,-0.7388669271,"https://salsa.debian.org/mopidy-team/mopidy-podcast","https://github.com/tkem/mopidy-podcast.git",2983.3689236111,2,1,0,3,30,0,0,30,2,"2",1.33333333333333,2 +"mopidy-podcast-itunes",-0.2467767179,2.4591937682,-0.834541946,"https://salsa.debian.org/mopidy-team/mopidy-podcast-itunes","https://github.com/tkem/mopidy-podcast-itunes",2949.6816087963,0,2,0,1,9,0,0,9,2,"2",2,2 +"mopidy-scrobbler",-0.2517299962,2.1335156702,-1.0325443783,"https://salsa.debian.org/mopidy-team/mopidy-scrobbler","https://github.com/mopidy/mopidy-scrobbler.git",3546.3970023148,0,2,0,1,49,0,0,49,2,"2",2,2 +"mopidy-somafm",-0.2746325835,2.1609819918,-0.859324666,"https://salsa.debian.org/mopidy-team/mopidy-somafm","https://github.com/AlexandrePTJ/mopidy-somafm",2714.300787037,0,6,2,4,27,0,0,27,1,"1",2,2 +"mopidy-soundcloud",-0.2546570011,2.1558962885,-0.9457836601,"https://salsa.debian.org/mopidy-team/mopidy-soundcloud","https://github.com/mopidy/mopidy-soundcloud",3733.2794212963,4,17,2,16,160,0,0,161,2,"2",1.80952380952381,1.99378881987578 +"mopidy-tunein",-0.3236002892,2.6224531521,-1.0905202326,"https://salsa.debian.org/mopidy-team/mopidy-tunein","https://github.com/kingosticks/mopidy-tunein",2521.2538657407,2,14,1,8,41,0,0,41,1,"1",1.875,2 +"mp3fs",0.9163678404,4.5727174058,-0.2047299256,"https://salsa.debian.org/multimedia-team/mp3fs","https://github.com/khenriks/mp3fs.git",5444.4987847222,4,13,0,8,77,0,1,80,4,"4",1.76470588235294,1.9625 +"mpDris2",-0.9856715769,-0.7754968336,-1.0277106449,"https://salsa.debian.org/debian/mpdris2","https://github.com/eonpatapon/mpDris2.git",4512.1038657407,12,20,0,28,118,0,0,119,3,"3",1.625,1.99159663865546 +"mpv",0.5363042562,0.8628802276,0.3101358986,"https://salsa.debian.org/multimedia-team/mpv","https://github.com/mpv-player/mpv",5787.7142361111,512,145,0,277,26,0,383,675,4,"4",1.220700152207,1.03851851851852 +"mrboom-libretro",-0.241313948,1.6810544874,-0.7335121433,"https://salsa.debian.org/games-team/mrboom","https://github.com/Javanaise/mrboom-libretro",2489.0620833333,22,22,0,31,43,0,0,54,1,"1",1.5,1.7962962962963 +"msktutil",-0.1662803901,1.2423651932,-0.5841886377,"https://salsa.debian.org/debian/msktutil","https://github.com/msktutil/msktutil",4695.5949305556,8,21,2,11,34,0,1,38,3,"3",1.72413793103448,1.89473684210526 +"mtr",2.0179049728,2.8158196867,1.452557991,"https://salsa.debian.org/debian/mtr","https://github.com/traviscross/mtr",3917.0060648148,16,90,0,75,432,0,0,433,3,"3",1.84905660377358,1.99769053117783 +"mupen64plus-ui-console",0.7264116732,3.6995007165,-0.1670734867,"https://salsa.debian.org/games-team/mupen64plus-ui-console","https://github.com/mupen64plus/mupen64plus-ui-console.git",4990.6788773148,5,31,0,19,34,0,0,39,4,"4",1.86111111111111,1.87179487179487 +"mupen64plus-video-glide64mk2",0.1293389165,2.4637475631,-0.3196538821,"https://salsa.debian.org/games-team/mupen64plus-video-glide64mk2","https://github.com/mupen64plus/mupen64plus-video-glide64mk2.git",4126.6609027778,7,35,0,24,59,0,0,64,3,"3",1.83333333333333,1.921875 +"mupen64plus-video-rice",0.1071841352,2.1766235067,-0.3149398833,"https://salsa.debian.org/games-team/mupen64plus-video-rice","https://github.com/mupen64plus/mupen64plus-video-rice.git",4977.9831481482,5,34,0,21,49,0,0,56,3,"3",1.87179487179487,1.875 +"muse",0.3513323565,0.8924420388,0.0076925385,"https://salsa.debian.org/multimedia-team/muse","https://github.com/muse-sequencer/muse.git",5773.0492476852,5,55,0,31,49,0,5,76,4,"4",1.91666666666667,1.64473684210526 +"python-musicbrainz-ngs",0.5076678121,2.1969185222,-0.005881406,"https://salsa.debian.org/python-team/packages/musicbrainzngs","https://github.com/alastair/python-musicbrainz-ngs",3992.7430092593,1,28,3,24,83,0,3,88,3,"3",1.96551724137931,1.94318181818182 +"mypaint",0.3480815429,1.0170198092,-0.0287146792,"https://salsa.debian.org/python-team/packages/mypaint","https://github.com/mypaint/mypaint",5559.7677199074,333,53,2,235,44,0,30,291,4,"4",1.13730569948187,1.15120274914089 +"mysecureshell",-0.4842069771,1.8606131049,-0.9637054818,"https://github.com/mysecureshell/mysecureshell","https://github.com/mysecureshell/mysecureshell",2575.5671990741,3,14,1,9,102,0,0,104,1,"1",1.82352941176471,1.98076923076923 +"MySQLTuner-perl",1.4500845033,4.4623073775,0.3464758377,"https://salsa.debian.org/debian/mysqltuner","https://github.com/major/MySQLTuner-perl",4651.9533217593,46,119,0,115,371,0,0,407,3,"3",1.72121212121212,1.91154791154791 +"n2n",0.1542450391,2.8427672865,-0.655319557,"https://github.com/leggewie-DM/n2n","https://github.com/leggewie-DM/n2n",3071.9561111111,2,3,0,3,2,0,0,5,2,"2",1.6,1.4 +"nabi",-1.1181697355,0.3411872046,-1.5057188398,"https://salsa.debian.org/l10n-korean-team/nabi","https://github.com/libhangul/nabi.git",5305.1766782407,0,3,0,1,5,0,1,6,4,"4",2,1.83333333333333 +"nadoka",-4.0224516234,-0.7310921121,-5.1260106864,"https://salsa.debian.org/ruby-team/nadoka","https://github.com/nadoka/nadoka",4550.0664351852,0,9,0,8,6,0,4,13,3,"3",2,1.46153846153846 +"nagvis",0.2016649842,1.2173315085,-0.3600392025,"https://salsa.debian.org/nagios-team/nagvis","https://github.com/NagVis/nagvis",5779.6260648148,42,38,0,37,263,0,0,268,4,"4",1.475,1.98134328358209 +"ndppd",-0.5295407302,1.6070155277,-1.0766996059,"https://salsa.debian.org/debian/ndppd","https://github.com/DanielAdolfsson/ndppd",4471.5943171296,7,15,1,11,75,0,0,77,3,"3",1.68181818181818,1.97402597402597 +"netcdf-cxx4",-0.359140508,1.3957561161,-0.7913195086,"https://salsa.debian.org/debian-gis-team/netcdf-cxx","https://github.com/Unidata/netcdf-cxx4.git",4438.9411805556,3,28,0,22,99,0,0,100,3,"3",1.90322580645161,1.99 +"netcdf-fortran",-0.1482258041,0.751301518,-0.2962965499,"https://salsa.debian.org/debian/netcdf-fortran","https://github.com/Unidata/netcdf-fortran.git",4488.0650115741,7,39,0,30,150,0,0,153,3,"3",1.84782608695652,1.98039215686275 +"netdiscover",0.2541652433,1.9765761262,-0.2111939526,"https://salsa.debian.org/debian/netdiscover","https://github.com/netdiscover-scanner/netdiscover",5323.4166087963,1,5,0,3,24,0,0,24,4,"4",1.83333333333333,2 +"netplan",0.0413337826,1.5404784729,-0.3486539272,"https://salsa.debian.org/debian/netplan.io","https://github.com/canonical/netplan/commits/master",5185.326875,55,11,0,0,0,0,0,0,4,"4",1.16666666666667,NA +"debian",0.1730522588,2.4986742151,-0.2783909483,"https://github.com/nm-l2tp/debian.git","https://github.com/nm-l2tp/debian.git",2347.114224537,1,1,0,2,0,0,0,2,1,"1",1.5,1 +"NetworkManager-ssh",-0.0086320792,1.1414433729,-0.2761809158,"https://salsa.debian.org/lhw-guest/network-manager-ssh","https://github.com/danfruehauf/NetworkManager-ssh",3197.1808449074,4,7,0,12,101,0,1,103,2,"2",1.63636363636364,1.98058252427184 +"nixnote2",-0.3647270032,0.4002965512,-0.4904591503,"https://salsa.debian.org/debian/nixnote2","https://github.com/robert7/nixnote2",4104.4428587963,11,48,0,37,124,0,4,152,3,"3",1.8135593220339,1.81578947368421 +"nmrpflash",-3.9117966743,-1.8322545897,-4.343551647,"https://salsa.debian.org/debian/nmrpflash","https://github.com/jclehner/nmrpflash",2833.1074768519,10,8,0,14,32,0,0,45,2,"2",1.44444444444444,1.71111111111111 +"babel-plugin-add-module-exports",-1.4169325387,1.5441837408,-2.1700991878,"https://salsa.debian.org/js-team/node-babel-plugin-add-module-exports","https://github.com/59naga/babel-plugin-add-module-exports",2579.5546180556,2,7,0,4,98,0,0,98,1,"1",1.77777777777778,2 +"base64url",-1.8861246737,0.890181623,-2.5677734916,"https://salsa.debian.org/js-team/node-base64url","https://github.com/brianloveswords/base64url.git",3614.4876388889,6,11,0,12,83,0,0,83,2,"2",1.64705882352941,2 +"node-bindings",-0.3124286212,2.605717497,-1.0137570127,"https://salsa.debian.org/js-team/node-bindings","https://github.com/TooTallNate/node-bindings",2587.1395949074,4,8,0,8,5,0,0,12,1,"1",1.66666666666667,1.41666666666667 +"bluebird",0.0584203533,1.0937802889,-0.1343492494,"https://salsa.debian.org/js-team/node-bluebird","https://github.com/petkaantonov/bluebird.git",3418.3106597222,121,152,0,212,654,0,64,848,2,"2",1.55677655677656,1.77122641509434 +"clean-css",0.1880139003,2.7123268564,-0.4696783378,"https://salsa.debian.org/js-team/node-clean-css","https://github.com/GoalSmashers/clean-css.git",4686.8824537037,63,58,0,89,14,0,9,111,3,"3",1.47933884297521,1.12612612612613 +"co",0.4601096377,2.8630730353,-0.1003269721,"https://salsa.debian.org/js-team/node-co","https://github.com/tj/co",1229.0172106482,17,46,0,49,211,0,49,264,1,"1",1.73015873015873,1.79924242424242 +"code",-4.7551646559,-1.4632937686,-5.4545700188,"https://salsa.debian.org/js-team/node-code","https://github.com/hapijs/code.git",3316.1678125,19,23,0,28,93,0,0,93,2,"2",1.54761904761905,2 +"coffeeify",-1.4017605239,1.4637076784,-2.2159952345,"https://salsa.debian.org/js-team/node-coffeeify","https://github.com/jnordberg/coffeeify.git",1705.9137731482,1,13,0,10,64,0,0,69,1,"1",1.92857142857143,1.92753623188406 +"colormin",-3.5089164725,-0.6840024754,-4.2685005942,"https://salsa.debian.org/js-team/node-colormin","https://github.com/ben-eb/colormin",2228.6048148148,0,6,0,2,15,0,0,15,1,"1",2,2 +"combine-source-map",-2.1067627582,1.451088997,-3.1431542202,"https://salsa.debian.org/js-team/node-combine-source-map","https://github.com/thlorenz/combine-source-map.git",1465.4289583333,4,5,0,8,33,0,0,33,1,"1",1.55555555555556,2 +"concat-stream",0.3435827993,2.8106720089,-0.124130821,"https://salsa.debian.org/js-team/node-concat-stream","https://github.com/maxogden/concat-stream.git",2331.5214583333,5,21,0,18,3,0,0,20,1,"1",1.80769230769231,1.15 +"constants-browserify",-0.11940227,2.8343540596,-0.9198546616,"https://salsa.debian.org/js-team/node-constants-browserify","https://github.com/juliangruber/constants-browserify",3669.6149189815,0,3,0,1,5,0,0,5,2,"2",2,2 +"content-disposition",-0.1498091429,2.3260602113,-0.8520258644,"https://salsa.debian.org/js-team/node-content-disposition","https://github.com/jshttp/content-disposition.git",2639.7443518519,6,2,0,6,32,0,0,32,1,"1",1.25,2 +"convert-source-map",0.0871772545,2.7765163193,-0.5756792774,"https://salsa.debian.org/js-team/node-convert-source-map","https://github.com/thlorenz/convert-source-map",3505.4009953704,16,11,0,22,67,0,0,67,2,"2",1.40740740740741,2 +"node-cookie-signature",0.0990081923,2.8247812735,-0.6845514149,"https://salsa.debian.org/js-team/node-cookie-signature","https://github.com/visionmedia/node-cookie-signature.git",3831.3145486111,2,13,0,7,47,0,0,48,3,"3",1.86666666666667,1.97916666666667 +"core-js",-0.0701104518,1.8860340205,-0.4290715682,"https://salsa.debian.org/js-team/node-core-js","https://github.com/zloirock/core-js.git",3801.3871990741,67,73,0,121,289,0,0,376,3,"3",1.52142857142857,1.7686170212766 +"d3-dsv",-0.6792934342,2.1613351331,-1.3775271458,"https://salsa.debian.org/js-team/node-d3-dsv","https://github.com/d3/d3-dsv",3863.8892013889,14,6,0,17,65,0,0,65,3,"3",1.3,2 +"node-dateformat",-0.01865954,1.6506546912,-0.4323251957,"https://salsa.debian.org/js-team/node-dateformat","https://github.com/felixge/node-dateformat",3995.8592476852,8,37,0,33,231,0,3,235,3,"3",1.82222222222222,1.98297872340426 +"execa",0.7079961346,3.9551483175,-0.0722137493,"https://salsa.debian.org/js-team/node-execa","https://github.com/sindresorhus/execa",2926.6958680556,49,7,0,53,128,0,0,157,2,"2",1.125,1.81528662420382 +"node-expat",-0.4080781453,2.3530029048,-1.5150203534,"https://salsa.debian.org/js-team/node-expat","https://github.com/astro/node-expat",4931.3002893519,7,34,0,29,341,0,1,344,3,"3",1.82926829268293,1.99127906976744 +"node-formidable",-1.0478352411,1.3329643424,-1.6311123883,"https://salsa.debian.org/js-team/node-formidable","https://github.com/felixge/node-formidable.git",4861.6687384259,45,72,0,80,292,0,0,334,3,"3",1.61538461538462,1.87425149700599 +"fuzzaldrin-plus",-0.9739589777,1.136573322,-1.4594019089,"https://salsa.debian.org/js-team/node-fuzzaldrin-plus","https://github.com/jeancroy/fuzzaldrin-plus",751.1080902778,2,6,0,3,29,0,0,29,1,"1",1.75,2 +"grunt-babel",-2.3567896079,-0.2595823007,-2.786480601,"https://salsa.debian.org/js-team/node-grunt-babel","https://github.com/babel/grunt-babel.git",3011.4746296296,8,12,0,13,152,0,0,152,2,"2",1.6,2 +"grunt-cli",1.2110710947,4.4921332971,4.42152270994788e-05,"https://salsa.debian.org/js-team/node-grunt-cli","https://github.com/gruntjs/grunt-cli.git",3126.2931944445,8,16,0,20,171,0,0,171,2,"2",1.66666666666667,2 +"gulp-babel",-1.6753037226,0.7240298055,-2.2929274971,"https://salsa.debian.org/js-team/node-gulp-babel","https://github.com/babel/gulp-babel.git",3018.4431018519,10,21,0,25,301,0,0,304,2,"2",1.67741935483871,1.99013157894737 +"gulp-flatten",-2.894365887,-0.8111009229,-3.321955765,"https://salsa.debian.org/js-team/node-gulp-flatten","https://github.com/armed/gulp-flatten",3247.6037152778,2,7,0,6,17,0,1,18,2,"2",1.77777777777778,1.94444444444444 +"gulp-load-plugins",-1.2725888367,2.2883154102,-2.2151032496,"https://salsa.debian.org/js-team/node-gulp-load-plugins","https://github.com/jackfranklin/gulp-load-plugins",3321.8455787037,10,29,0,26,138,0,0,138,2,"2",1.74358974358974,2 +"node-gyp",0.0377305117,0.6211458053,-0.1173242042,"https://salsa.debian.org/js-team/node-gyp","https://github.com/nodejs/node-gyp.git",4297.5489699074,197,73,0,223,832,0,50,1053,3,"3",1.27037037037037,1.79012345679012 +"has-flag",0.3334743676,2.4592111562,-0.1192014058,"https://salsa.debian.org/js-team/node-has-flag","https://github.com/sindresorhus/has-flag",2203.7011111111,6,2,0,7,17,0,0,17,1,"1",1.25,2 +"inline-source-map",-1.7253778479,0.3256715997,-2.1428170788,"https://salsa.debian.org/js-team/node-inline-source-map","https://github.com/thlorenz/inline-source-map.git",3126.5302314815,5,5,0,9,25,0,0,25,2,"2",1.5,2 +"node-ip",0.5473402205,3.0729874251,-0.1357528421,"https://salsa.debian.org/js-team/node-ip","https://github.com/indutny/node-ip",3990.2488194445,6,20,0,17,172,0,0,173,3,"3",1.76923076923077,1.99421965317919 +"node-is-arrayish",-0.0113184631,2.4802704151,-0.5878636382,"https://salsa.debian.org/js-team/node-is-arrayish","https://github.com/qix-/node-is-arrayish",1162.9688194445,2,9,0,3,10,0,0,10,1,"1",1.81818181818182,2 +"is-glob",0.6638373369,3.8445632106,-0.214727985,"https://salsa.debian.org/js-team/node-is-glob","https://github.com/jonschlinkert/is-glob",2500.3032986111,3,9,0,5,18,0,0,18,1,"1",1.75,2 +"iscroll",0.3236470898,2.6334834534,-0.1547197624,"https://salsa.debian.org/js-team/node-iscroll","https://github.com/cubiq/iscroll",2222.4944791667,9,37,0,11,375,0,5,391,1,"1",1.80434782608696,1.95907928388747 +"jison",-2.8705191059,-0.5904861053,-3.3214497471,"https://salsa.debian.org/js-team/node-jison","https://github.com/zaach/jison",3961.6974305556,7,59,1,40,368,0,51,421,3,"3",1.89393939393939,1.87410926365796 +"jquery-mousewheel",0.2686821158,2.6543019787,-0.1911219866,"https://salsa.debian.org/js-team/node-jquery-mousewheel","https://github.com/jquery/jquery-mousewheel",5390.8646296296,6,15,1,14,292,0,0,293,4,"4",1.71428571428571,1.99658703071672 +"millstone",-1.4457365806,1.0910699973,-2.0387356121,"https://salsa.debian.org/js-team/node-millstone","https://github.com/mapbox/millstone",4176.2971875,3,21,0,13,36,0,0,37,3,"3",1.875,1.97297297297297 +"mqtt-packet",-2.1961592069,0.0425211631,-2.6185433222,"https://salsa.debian.org/js-team/node-mqtt-packet","https://github.com/mqttjs/mqtt-packet",3391.8497337963,19,27,0,34,71,0,0,77,2,"2",1.58695652173913,1.92207792207792 +"on-finished",0.0613223619,2.8531731142,-0.6913305342,"https://salsa.debian.org/js-team/node-on-finished","https://github.com/jshttp/on-finished",3350.0634259259,5,3,0,7,4,0,0,9,2,"2",1.375,1.44444444444444 +"once",-0.1226053888,-0.1171397715,-0.1237821835,"https://salsa.debian.org/js-team/node-once","https://github.com/isaacs/once.git",4074.419212963,2,6,0,6,15,0,0,15,3,"3",1.75,2 +"os-browserify",-0.3268262004,2.3252681953,-0.9671784701,"https://salsa.debian.org/js-team/node-os-browserify","https://github.com/CoderPuppy/os-browserify",1580.0713425926,1,7,0,3,9,0,0,9,1,"1",1.875,2 +"parse-glob",0.6847833884,3.868282575,-0.2490532696,"https://salsa.debian.org/js-team/node-parse-glob","https://github.com/micromatch/parse-glob",1589.2864351852,1,5,0,3,6,0,0,6,1,"1",1.83333333333333,2 +"parseurl",0.275713727,3.6232142368,-0.6473483724,"https://salsa.debian.org/js-team/node-parseurl","https://github.com/expressjs/parseurl.git",3251.1265972222,2,3,0,5,12,0,0,12,2,"2",1.6,2 +"FlashPolicyFileServer",-0.9515002748,1.7831825682,-1.7365256836,"https://salsa.debian.org/js-team/node-policyfile","https://github.com/3rd-Eden/FlashPolicyFileServer",2142.8337037037,0,3,0,3,14,0,0,14,1,"1",2,2 +"react-audio-player",-4.8100583491,-2.4298503474,-5.420558223,"https://salsa.debian.org/js-team/node-react-audio-player","https://github.com/justinmc/react-audio-player.git",2489.7878125,9,20,0,18,119,0,0,119,1,"1",1.68965517241379,2 +"regenerate-unicode-properties",-0.6674866267,0.9618352502,-1.0118784845,"https://salsa.debian.org/js-team/node-regenerate-unicode-properties","https://github.com/mathiasbynens/regenerate-unicode-properties",2664.7656597222,3,2,0,4,7,0,0,7,1,"1",1.4,2 +"regjsparser",-0.7798404163,1.2003365063,-1.1962820592,"https://salsa.debian.org/js-team/node-regjsparser","https://github.com/jviereck/regjsparser.git",3676.996875,2,16,0,12,27,0,0,27,2,"2",1.88888888888889,2 +"node-resolve",0.5575663073,3.2984179044,-0.1407771771,"https://salsa.debian.org/js-team/node-resolve","https://github.com/substack/node-resolve.git",4523.8015162037,39,26,0,50,258,0,0,259,3,"3",1.4,1.996138996139 +"sprintf.js",0.4014290609,3.1578856064,-0.2132993373,"https://salsa.debian.org/js-team/node-sprintf-js","https://github.com/alexei/sprintf.js",3813.8363078704,3,28,0,21,190,0,0,191,3,"3",1.90322580645161,1.99476439790576 +"static-module",-2.9295084562,0.0141965632,-3.6919322552,"https://salsa.debian.org/js-team/node-static-module","https://github.com/substack/static-module.git",3102.503912037,8,14,0,17,66,0,0,66,2,"2",1.63636363636364,2 +"node-stringprep",-1.25858701,1.4295408548,-2.2227266177,"https://salsa.debian.org/js-team/node-stringprep","https://github.com/node-xmpp/node-stringprep",2104.0097800926,2,22,0,18,115,0,1,118,1,"1",1.91666666666667,1.97457627118644 +"tape",-1.3533456222,0.8230887097,-1.8448352117,"https://salsa.debian.org/js-team/node-tape","https://github.com/ljharb/tape.git",4022.1372916667,54,62,0,96,488,0,0,500,3,"3",1.53448275862069,1.976 +"node-tar",0.10092401,1.1554569611,-0.1194951399,"https://salsa.debian.org/js-team/node-tar","https://github.com/npm/node-tar",4544.3033449074,24,18,1,38,142,0,0,162,3,"3",1.42857142857143,1.87654320987654 +"node-temp",-0.8998725735,2.4095798708,-1.9534582368,"https://salsa.debian.org/js-team/node-temp","https://github.com/bruce/node-temp",4595.6285416667,2,39,2,31,105,0,0,109,3,"3",1.95121951219512,1.96330275229358 +"json-document",-4.9532456218,-2.9019375195,-5.4554167334,"https://salsa.debian.org/js-team/node-trust-json-document","https://github.com/anvilresearch/json-document.git",471.8604513889,0,5,0,4,7,0,0,7,1,"1",2,2 +"tunnel-agent",1.1792785071,4.9631632678,0.1110924805,"https://salsa.debian.org/js-team/node-tunnel-agent","https://github.com/mikeal/tunnel-agent",1464.1568634259,0,12,0,9,131,0,0,132,1,"1",2,1.99242424242424 +"type-check",-0.619856367,1.5719870744,-1.0599876067,"https://salsa.debian.org/js-team/node-type-check","https://github.com/gkz/type-check.git",3579.125787037,2,5,0,3,20,0,1,21,2,"2",1.71428571428571,1.95238095238095 +"ultron",-2.7813197419,-0.4758682807,-3.3070168453,"https://salsa.debian.org/js-team/node-ultron","https://github.com/unshiftio/ultron",2972.2796527778,1,7,0,5,13,0,0,13,2,"2",1.875,2 +"node-unicode-data",-2.4986839661,-1.5066066307,-2.7694541364,"https://salsa.debian.org/js-team/node-unicode-data","https://github.com/mathiasbynens/node-unicode-data.git",3658.0537962963,6,3,0,7,29,0,0,29,2,"2",1.33333333333333,2 +"unicode-property-aliases",-2.1224965726,0.5054136483,-2.7508821504,"https://salsa.debian.org/js-team/node-unicode-property-aliases","https://github.com/mathiasbynens/unicode-property-aliases",2644.0663657408,2,1,0,3,4,0,0,4,1,"1",1.33333333333333,2 +"unicode-property-aliases-ecmascript",-0.4930241449,2.1362080223,-1.1371319719,"https://salsa.debian.org/js-team/node-unicode-property-aliases-ecmascript","https://github.com/mathiasbynens/unicode-property-aliases-ecmascript",1978.1429398148,1,2,0,2,3,0,0,3,1,"1",1.66666666666667,2 +"unicode-property-value-aliases",-2.108074165,0.5458957808,-2.7511821006,"https://salsa.debian.org/js-team/node-unicode-property-value-aliases","https://github.com/mathiasbynens/unicode-property-value-aliases.git",2643.9666898148,2,2,0,3,3,0,0,3,1,"1",1.5,2 +"unicode-property-value-aliases-ecmascript",-2.6459525399,-0.0300807748,-3.2844645306,"https://salsa.debian.org/js-team/node-unicode-property-value-aliases-ecmascript","https://github.com/mathiasbynens/unicode-property-value-aliases-ecmascript",1977.9928009259,0,1,0,1,0,0,0,1,1,"1",2,1 +"unicode-tr51",-2.8970799304,-0.9087592402,-3.3116008945,"https://salsa.debian.org/js-team/node-unicode-tr51","https://github.com/mathiasbynens/unicode-tr51",1619.1367939815,1,1,0,2,6,0,0,6,1,"1",1.5,2 +"utilities",0.7510248514,4.5416704471,-0.5676243448,"https://salsa.debian.org/js-team/node-utilities","https://github.com/mde/utilities.git",3873.0201388889,1,19,0,12,22,0,0,22,3,"3",1.95,2 +"node-uuid",0.283624179,1.6049599044,-0.0900742762,"https://salsa.debian.org/js-team/node-uuid","https://github.com/kelektiv/node-uuid",4670.2036805556,41,41,2,59,325,0,0,354,3,"3",1.5,1.9180790960452 +"node-v8flags",0.1190291187,2.504747846,-0.5070823362,"https://salsa.debian.org/js-team/node-v8flags","https://github.com/tkellen/node-v8flags.git",1721.1332407407,15,3,0,11,73,0,0,73,1,"1",1.16666666666667,2 +"vhost",-1.6545263406,0.6845370117,-2.2878465779,"https://salsa.debian.org/js-team/node-vhost","https://github.com/expressjs/vhost.git",3246.905150463,1,3,0,2,0,0,0,2,2,"2",1.75,1 +"vue-resource",-1.8045687517,-0.3856069237,-2.0705983161,"https://salsa.debian.org/js-team/node-vue-resource","https://github.com/pagekit/vue-resource",2754.4118518519,8,21,0,22,133,0,6,153,2,"2",1.72413793103448,1.86928104575163 +"webpack-merge",-3.8493072011,-1.380862227,-4.3376760901,"https://salsa.debian.org/js-team/node-webpack-merge","https://github.com/survivejs/webpack-merge.git",3033.8957060185,15,23,0,32,63,0,0,78,2,"2",1.60526315789474,1.80769230769231 +"node-ytdl-core",-0.1246800443,2.4581193839,-0.8183512675,"https://salsa.debian.org/js-team/node-ytdl-core","https://github.com/fent/node-ytdl-core.git",4096.004525463,70,23,0,76,490,0,0,521,3,"3",1.24731182795699,1.9404990403071 +"ntirpc",-0.5951678873,1.6658190607,-1.2552045305,"https://salsa.debian.org/debian/libntirpc","https://github.com/nfs-ganesha/ntirpc.git",4521.189837963,43,88,0,41,65,0,0,76,3,"3",1.67175572519084,1.85526315789474 +"Nuitka",-0.0866725521,0.7058083517,-0.4988086801,"https://github.com/Nuitka/Nuitka","https://github.com/Nuitka/Nuitka",4857.7762847222,166,5,3,152,130,0,0,253,3,"3",1.02923976608187,1.51383399209486 +"nvidia-xconfig",0.9734320248,2.4417272676,0.2943686593,"https://salsa.debian.org/nvidia-team/nvidia-xconfig","https://github.com/NVIDIA/nvidia-xconfig",5775.9081134259,1,3,0,4,2,0,0,6,4,"4",1.75,1.33333333333333 +"nvpy",-0.3144467073,2.8922861575,-1.2852911447,"https://github.com/stefanv/nvpy/tree/debian","https://github.com/stefanv/nvpy",2724.1981134259,2,29,0,16,0,0,0,16,1,"1",1.93548387096774,1 +"O-Saft",-0.0182736193,2.1999044406,-0.4504212317,"https://salsa.debian.org/pkg-security-team/o-saft","https://github.com/OWASP/O-Saft",4011.0202777778,3,10,0,9,40,0,0,40,3,"3",1.76923076923077,2 +"oar",-1.4634945941,-0.6606837191,-1.7817291006,"https://github.com/oar-team/oar","https://github.com/oar-team/oar",5765.8415856482,5,46,5,15,43,0,0,45,4,"4",1.90196078431373,1.95555555555556 +"obconf-debian",0.7475755733,1.7842164637,0.2203904311,"https://github.com/mati75/obconf-debian.git","https://github.com/mati75/obconf-debian.git",3725.6903935185,0,5,0,3,2,0,0,4,2,"2",2,1.5 +"obs-studio",0.1312922919,0.962234072,-0.1232421438,"https://salsa.debian.org/multimedia-team/obs-studio","https://github.com/jp9000/obs-studio.git",3726.9157986111,426,253,0,412,244,0,264,855,2,"2",1.37260677466863,1.28538011695906 +"obus",-3.5252462011,-1.6650389666,-4.1632184213,"https://salsa.debian.org/ocaml-team/obus","https://github.com/ocaml-community/obus",5340.5275115741,3,16,1,12,20,0,0,22,4,"4",1.84210526315789,1.90909090909091 +"ocaml-alsa",-0.6651242782,1.2653797989,-1.038375358,"https://salsa.debian.org/ocaml-team/ocaml-alsa","https://github.com/savonet/ocaml-alsa.git",460.5193634259,2,8,0,5,4,0,0,6,1,"1",1.8,1.66666666666667 +"ocaml-duppy",-1.3054931735,1.4664487385,-2.0959619861,"https://salsa.debian.org/ocaml-team/ocaml-duppy","https://github.com/savonet/ocaml-duppy.git",5432.8347337963,2,8,0,6,6,0,0,8,4,"4",1.8,1.75 +"ocaml-expect",-1.1271032549,2.7923660814,-2.3065192266,"https://salsa.debian.org/ocaml-team/ocaml-expect","https://github.com/gildor478/ocaml-expect.git",3170.2275231482,0,3,0,1,2,0,0,2,2,"2",2,2 +"extunix",-2.1872917146,-0.3028149378,-2.608406683,"https://salsa.debian.org/ocaml-team/ocaml-extunix","https://github.com/ygrek/extunix.git",4849.8496064815,10,12,0,18,30,0,0,33,3,"3",1.54545454545455,1.90909090909091 +"ocaml-ipaddr",-1.0446018994,1.8622042043,-1.7854758695,"https://salsa.debian.org/ocaml-team/ocaml-ipaddr","https://github.com/mirage/ocaml-ipaddr.git",3725.5192476852,9,20,0,22,40,0,0,40,2,"2",1.68965517241379,2 +"ocaml-re",-1.0950401153,1.1685448483,-1.5345632117,"https://salsa.debian.org/ocaml-team/ocaml-re","https://github.com/ocaml/ocaml-re",4365.6594907407,11,42,1,39,72,0,0,79,3,"3",1.79245283018868,1.91139240506329 +"sedlex",-2.795399504,0.6121377346,-3.6635666836,"https://salsa.debian.org/ocaml-team/ocaml-sedlex","https://github.com/ocaml-community/sedlex",5659.0575925926,13,22,0,27,81,0,0,81,4,"4",1.62857142857143,2 +"ocamlbuild",0.83301295,3.604633508,-0.2606702303,"https://salsa.debian.org/ocaml-team/ocamlbuild","https://github.com/ocaml/ocamlbuild.git",5691.866099537,18,45,0,44,121,0,0,131,4,"4",1.71428571428571,1.9236641221374 +"opencubicplayer",0.7353360216,1.8994727767,0.1001948826,"https://salsa.debian.org/multimedia-team/ocp","https://github.com/mywave82/opencubicplayer",4416.0663310185,9,13,0,12,37,0,0,38,3,"3",1.59090909090909,1.97368421052632 +"open-ath9k-htc-firmware",0.7603141973,2.9426626321,-0.0525201094,"https://salsa.debian.org/debian/open-ath9k-htc-firmware","https://github.com/qca/open-ath9k-htc-firmware.git",3892.0404398148,5,21,0,17,37,0,4,51,3,"3",1.80769230769231,1.72549019607843 +"openbox-debian",0.3587708308,0.5696355779,0.2001738591,"https://github.com/mati75/openbox-debian","https://github.com/mati75/openbox-debian",3123.4283217593,2,10,0,8,12,0,0,12,2,"2",1.83333333333333,2 +"openbox-menu",0.6431292738,3.0088710056,-0.1389880185,"https://github.com/mati75/openbox-menu.git","https://github.com/mati75/openbox-menu.git",2669.041875,1,4,0,4,3,0,0,4,1,"1",1.8,1.75 +"OpenCC",0.0219092289,0.4824222963,-0.1611861662,"https://salsa.debian.org/debian/opencc","https://github.com/BYVoid/OpenCC",3838.8327430556,56,72,0,83,474,0,3,480,3,"3",1.5625,1.9875 +"opendht",-1.502253613,-0.1124423197,-1.9255361455,"https://salsa.debian.org/debian/opendht","https://github.com/savoirfairelinux/opendht.git",3308.8721527778,32,40,0,40,23,0,13,63,2,"2",1.55555555555556,1.36507936507937 +"orocos_kinematics_dynamics",-0.4945558152,0.6669109207,-0.7546541561,"https://salsa.debian.org/science-team/orocos-kdl","https://github.com/orocos/orocos_kinematics_dynamics.git",5760.2385532407,20,61,0,49,251,0,0,254,4,"4",1.75308641975309,1.98818897637795 +"osdlyrics",-1.0107652487,2.5410275398,-1.9364271071,"https://salsa.debian.org/debian/osdlyrics","https://github.com/osdlyrics/osdlyrics.git",5185.1183796296,14,35,0,23,0,0,1,24,4,"4",1.71428571428571,1 +"osm-gps-map",0.4852394822,1.6315652979,0.0288716929,"https://salsa.debian.org/debian-gis-team/osm-gps-map","https://github.com/nzjrs/osm-gps-map",5396.5783564815,12,33,1,30,59,0,0,67,4,"4",1.73333333333333,1.88059701492537 +"ossim",0.2194206159,1.4101222421,-0.3093741078,"https://salsa.debian.org/debian-gis-team/ossim","https://github.com/ossimlabs/ossim.git",2917.9942824074,12,49,0,31,11,0,1,36,2,"2",1.80327868852459,1.30555555555556 +"osslsigncode",0.169238484,2.9087642476,-0.725862886,"https://salsa.debian.org/debian/osslsigncode","https://github.com/mtrojnar/osslsigncode.git",3941.3454282407,25,12,0,28,157,0,0,162,3,"3",1.32432432432432,1.96913580246914 +"ostinato",-0.1569756889,1.8345639417,-0.7645775616,"https://salsa.debian.org/debian/ostinato","https://github.com/pstavirs/ostinato",3046.7549884259,4,10,3,11,90,0,2,95,2,"2",1.71428571428571,1.94736842105263 +"othman",-1.2792306,0.9010183816,-1.7193110897,"https://salsa.debian.org/islamic-team/othman","https://github.com/ojuba-org/othman.git",4827.9828240741,2,13,0,8,20,0,0,21,3,"3",1.86666666666667,1.95238095238095 +"ounit",-0.3627412562,0.4497117871,-0.6191203191,"https://salsa.debian.org/ocaml-team/ounit","https://github.com/gildor478/ounit.git",1284.2142476852,12,7,0,14,26,0,0,26,1,"1",1.36842105263158,2 +"outguess",0.1497827549,1.0974956579,-0.226083673,"https://salsa.debian.org/pkg-security-team/outguess","https://github.com/resurrecting-open-source-projects/outguess",1029.0813888889,1,3,0,2,9,0,0,9,1,"1",1.75,2 +"overpass-api-python-wrapper",-0.0322169908,2.6635478479,-0.7275603387,"https://salsa.debian.org/python-team/packages/overpass","https://github.com/mvexel/overpass-api-python-wrapper.git",2968.0383449074,4,26,0,24,100,0,0,102,2,"2",1.86666666666667,1.98039215686275 +"papi",0.1648741367,1.7494996599,-0.3472045276,"https://salsa.debian.org/hpc-team/papi","https://github.com/icl-utk-edu/papi",5785.0656134259,65,102,1,48,33,0,13,73,4,"4",1.61077844311377,1.45205479452055 +"par2cmdline",0.20056085,0.9463023937,-0.114418384,"https://salsa.debian.org/jcfp/par2cmdline","https://github.com/Parchive/par2cmdline.git",4198.3890972222,9,27,0,27,115,0,0,117,3,"3",1.75,1.98290598290598 +"parsedatetime",1.1943669328,3.3711848516,0.3370468439,"https://salsa.debian.org/python-team/packages/parsedatetime","https://github.com/bear/parsedatetime",3739.2471990741,8,57,2,39,150,0,0,150,2,"2",1.87692307692308,2 +"patsy",0.2674917865,1.4192573153,-0.1261483397,"https://salsa.debian.org/med-team/patsy","https://github.com/pydata/patsy",4676.8131944445,3,15,0,17,197,0,0,199,3,"3",1.83333333333333,1.98994974874372 +"pavucontrol-qt",1.2464488625,4.8736917607,0.1529128395,"https://salsa.debian.org/lxqt-team/pavucontrol-qt","https://github.com/lxqt/pavucontrol-qt.git",5699.7374189815,142,57,0,110,74,0,0,152,4,"4",1.28643216080402,1.48684210526316 +"pbcopper",-1.3874159842,-0.0972708879,-1.836455251,"https://salsa.debian.org/med-team/pbcopper","https://github.com/PacificBiosciences/pbcopper.git",2608.9496875,0,25,0,9,5,0,0,11,1,"1",2,1.45454545454545 +"pcapfix",0.0933295762,2.1324165499,-0.3712900504,"https://salsa.debian.org/debian/pcapfix","https://github.com/Rup0rt/pcapfix",3586.925,0,13,0,6,14,0,0,14,2,"2",2,2 +"pcapy",0.0349538125,1.2547992825,-0.3075562935,"https://salsa.debian.org/python-team/packages/pcapy","https://github.com/CoreSecurity/pcapy.git",1937.2327893519,7,20,0,17,91,0,6,99,1,"1",1.74074074074074,1.91919191919192 +"pcl",-0.4344154152,-0.1858665736,-0.5376364213,"https://salsa.debian.org/science-team/pcl","https://github.com/PointCloudLibrary/pcl",4663.6967824074,183,548,3,326,69,0,19,379,3,"3",1.74965800273598,1.1820580474934 +"pcmanfm",0.9104711528,1.3106826431,0.6098723045,"https://salsa.debian.org/lxde-team/pcmanfm","https://github.com/lxde/pcmanfm",5014.9549074074,162,27,0,87,11,0,0,91,4,"4",1.14285714285714,1.12087912087912 +"flext",-0.0850254405,1.799559297,-0.6918728933,"https://salsa.debian.org/multimedia-team/pd/pd-flext","https://github.com/grrrr/flext.git",5601.7882986111,3,10,0,6,23,0,0,23,4,"4",1.76923076923077,2 +"ggee",0.2137381335,2.1051137101,-0.4192763849,"https://salsa.debian.org/multimedia-team/pd/pd-ggee","https://github.com/pd-externals/ggee",5602.6691782407,2,15,0,6,8,0,0,10,4,"4",1.88235294117647,1.8 +"pd-iemmatrix",-0.3267928639,1.4162291626,-0.7027745657,"https://salsa.debian.org/multimedia-team/pd/pd-iemmatrix","https://github.com/iem-projects/pd-iemmatrix",5648.0384606482,0,11,0,2,0,0,0,2,4,"4",2,1 +"pdfminer.six",0.0208023168,1.0139403963,-0.2584702373,"https://salsa.debian.org/python-team/packages/pdfminer","https://github.com/pdfminer/pdfminer.six.git",5691.1447916667,73,66,0,116,635,0,0,663,4,"4",1.47482014388489,1.9577677224736 +"peek",0.2213731786,2.283866536,-0.2790469573,"https://salsa.debian.org/debian/peek","https://github.com/phw/peek.git",2556.2171064815,148,23,0,127,504,0,0,601,1,"1",1.13450292397661,1.83860232945092 +"perftest",-0.25506659,1.1624795547,-0.6480880894,"https://salsa.debian.org/hpc-team/perftest","https://github.com/linux-rdma/perftest.git",5766.2372222222,45,67,0,63,139,0,1,158,4,"4",1.59821428571429,1.87974683544304 +"perl-cross-debian",0.5442661596,4.5107736512,-0.7462109296,"https://github.com/codehelp/perl-cross-debian","https://github.com/codehelp/perl-cross-debian",413.1343634259,0,1,2,1,2,0,1,3,1,"1",2,1.66666666666667 +"project--perl-depends",-0.098094395,2.6971113742,-0.7916189031,"https://salsa.debian.org/perl-team/modules/packages/perl-depends","https://github.com/jaalto/project--perl-depends.git",2417.02125,0,1,0,1,0,0,0,1,1,"1",2,1 +"perl6-readline",0.2335812759,2.6358883052,-0.5015207605,"https://salsa.debian.org/perl6-team/modules/perl6-readline","https://github.com/drforr/perl6-readline.git",1710.4289351852,3,11,0,10,39,0,0,39,1,"1",1.78571428571429,2 +"zef",-0.1589879333,1.6245616073,-0.6015634669,"https://salsa.debian.org/perl6-team/modules/perl6-zef","https://github.com/ugexe/zef.git",3805.8422569445,19,20,0,23,111,0,0,113,3,"3",1.51282051282051,1.98230088495575 +"persp-projectile",-0.639585185,3.286323439,-1.7735281377,"https://salsa.debian.org/emacsen-team/persp-projectile","https://github.com/bbatsov/persp-projectile.git",2006.7800810185,9,2,0,10,40,0,0,40,1,"1",1.18181818181818,2 +"pev",0.3261969594,2.6071816741,-0.2973930728,"https://salsa.debian.org/debian/pev","https://github.com/merces/pev",0.0019791667,1,1,0,1,0,0,0,1,1,"1",1.5,1 +"pexpect",0.8141215364,1.9888952072,0.2667748433,"https://salsa.debian.org/python-team/packages/pexpect","https://github.com/pexpect/pexpect",5767.4715740741,21,92,0,85,558,0,0,562,4,"4",1.8141592920354,1.99288256227758 +"pg_checksums",-1.8213442024,-0.1372969868,-2.2303187848,"https://salsa.debian.org/postgresql/pg-checksums","https://github.com/credativ/pg_checksums.git",1977.03125,1,6,0,4,9,0,0,9,1,"1",1.85714285714286,2 +"pg_fact_loader",-1.8451499975,1.7612439253,-2.8557684329,"https://salsa.debian.org/postgresql/pg-fact-loader","https://github.com/enova/pg_fact_loader.git",1795.1245717593,2,6,0,5,3,0,0,5,1,"1",1.75,1.6 +"pg8000",-0.425873307,2.4793925595,-1.2002236195,"https://salsa.debian.org/python-team/packages/pg8000","https://github.com/mfenniak/pg8000",3962.2166666667,11,25,0,20,142,0,0,145,3,"3",1.69444444444444,1.97931034482759 +"pgbadger",-0.3152167506,1.8941783522,-0.7500435836,"https://salsa.debian.org/postgresql/pgbadger","https://github.com/darold/pgbadger.git",4259.9847222222,12,88,0,68,205,0,7,250,3,"3",1.88,1.82 +"pgsql-ogr-fdw",-1.597217053,1.098990575,-2.2031431994,"https://salsa.debian.org/debian-gis-team/pgsql-ogr-fdw","https://github.com/pramsey/pgsql-ogr-fdw.git",3285.0248958333,8,10,0,9,59,0,0,59,2,"2",1.55555555555556,2 +"semver",0.409271213,2.8658685018,-0.146438012,"https://salsa.debian.org/php-team/pear/php-composer-semver","https://github.com/composer/semver",2969.0927777778,37,21,0,44,78,0,1,97,2,"2",1.36206896551724,1.80412371134021 +"Console_Table",-0.0495487945,1.7830511717,-0.4127695523,"https://salsa.debian.org/php-team/pear/php-console-table","https://github.com/pear/Console_Table.git",2649.3105555556,1,12,0,9,14,0,0,16,1,"1",1.92307692307692,1.875 +"constant_time_encoding",-2.0834505626,2.1057169386,-3.3638483931,"https://salsa.debian.org/php-team/pear/php-constant-time","https://github.com/paragonie/constant_time_encoding",2771.7821296296,7,11,0,13,33,0,0,33,2,"2",1.61111111111111,2 +"Crypt_GPG",0.9210658037,4.3264478549,-0.3696792994,"https://salsa.debian.org/php-team/pear/php-crypt-gpg","https://github.com/pear/Crypt_GPG.git",5743.4965972222,6,19,0,16,21,0,0,22,4,"4",1.76,1.95454545454545 +"DirectoryScanner",-0.4493402088,1.855270065,-0.9050981717,"https://salsa.debian.org/php-team/pear/php-directory-scanner","https://github.com/theseer/DirectoryScanner.git",4264.1542361111,0,7,0,2,12,0,0,12,3,"3",2,2 +"link-util",-0.4425381847,2.4746022946,-1.2653714987,"https://salsa.debian.org/php-team/pear/php-fig-link-util","https://github.com/php-fig/link-util",1680.1398148148,5,2,0,5,11,0,0,12,1,"1",1.28571428571429,1.91666666666667 +"php-file-iterator",0.3114533151,2.1129587477,-0.2420172005,"https://salsa.debian.org/php-team/pear/php-file-iterator","https://github.com/sebastianbergmann/php-file-iterator",5147.3262731482,9,12,0,16,79,0,0,80,4,"4",1.57142857142857,1.9875 +"horde",-0.4754819462,0.1936727976,-0.7289488029,"https://salsa.debian.org/horde-team/php-horde","https://github.com/horde/horde.git",3269.665474537,81,80,0,67,71,0,0,99,2,"2",1.49689440993789,1.71717171717172 +"ActiveSync",-0.0745412838,1.9029925216,-0.5969694129,"https://salsa.debian.org/horde-team/php-horde-activesync","https://github.com/horde/ActiveSync.git",4982.0443055556,9,18,0,13,5,0,0,14,4,"4",1.66666666666667,1.35714285714286 +"html5-php",-0.3208200552,2.1227649729,-0.8298475571,"https://salsa.debian.org/php-team/pear/php-masterminds-html5","https://github.com/Masterminds/html5-php",3846.3884953704,7,39,1,37,85,0,6,98,3,"3",1.84782608695652,1.86734693877551 +"vfsStream",-3.8146826401,-1.3125722962,-4.3356315795,"https://salsa.debian.org/php-team/pear/php-mikey179-vfsstream","https://github.com/bovigo/vfsStream",5683.6370138889,11,48,1,35,196,0,26,222,4,"4",1.8135593220339,1.88288288288288 +"monolog",0.5054135947,3.1708681094,-0.3793108578,"https://salsa.debian.org/php-team/pear/php-monolog","https://github.com/Seldaek/monolog",4676.6184375,183,372,3,397,405,0,63,719,3,"3",1.67027027027027,1.56328233657858 +"TypeResolver",0.0218360214,2.3125319388,-0.4129888352,"https://salsa.debian.org/php-team/pear/php-phpdocumentor-type-resolver","https://github.com/phpDocumentor/TypeResolver",3092.0947569445,18,31,1,40,91,0,0,91,2,"2",1.63265306122449,2 +"phpseclib",0.1530214382,1.601109808,-0.1147352727,"https://salsa.debian.org/php-team/pear/phpseclib","https://github.com/phpseclib/phpseclib.git",5749.2331828704,80,98,0,135,155,0,5,268,4,"4",1.55056179775281,1.57835820895522 +"sql-formatter",-0.407920411,2.2773849827,-1.1530054701,"https://salsa.debian.org/php-team/pear/php-sql-formatter","https://github.com/doctrine/sql-formatter.git",4125.6360300926,10,31,0,25,28,0,0,42,3,"3",1.75609756097561,1.66666666666667 +"contracts",0.6071508908,3.5307618183,-0.1882490235,"https://salsa.debian.org/php-team/pear/php-symfony-contracts","https://github.com/symfony/contracts",1906.8477083333,28,26,0,51,11,0,0,57,1,"1",1.48148148148148,1.19298245614035 +"polyfill",0.5936130532,2.9045150589,-0.1004774059,"https://salsa.debian.org/php-team/pear/php-symfony-polyfill","https://github.com/symfony/polyfill",2902.2220949074,100,47,0,117,227,0,0,263,2,"2",1.31972789115646,1.86311787072243 +"text_password",0.8003864076,3.7354461105,-0.2651582454,"https://salsa.debian.org/php-team/pear/php-text-password","https://github.com/pear/text_password.git",3427.7869097222,0,13,0,7,6,0,0,8,2,"2",2,1.75 +"php-text-template",0.2735156083,2.2577473237,-0.2649626383,"https://salsa.debian.org/php-team/pear/php-text-template","https://github.com/sebastianbergmann/php-text-template",5133.0452083333,0,8,0,5,13,0,0,13,4,"4",2,2 +"CssToInlineStyles",-4.9581043824,-2.5632479534,-5.4701338922,"https://salsa.debian.org/php-team/pear/php-tijsverkoyen-css-to-inline-styles","https://github.com/tijsverkoyen/CssToInlineStyles",4791.6600810185,7,34,0,31,149,0,0,158,3,"3",1.82926829268293,1.94303797468354 +"php-timer",0.0545002782,1.7354029969,-0.3034123852,"https://salsa.debian.org/php-team/pear/php-timer","https://github.com/sebastianbergmann/php-timer",4962.9242824074,4,10,0,11,38,0,0,38,3,"3",1.71428571428571,2 +"php-token-stream",-0.077539845,1.0314574326,-0.3184738926,"https://salsa.debian.org/php-team/pear/php-token-stream","https://github.com/sebastianbergmann/php-token-stream",4281.2169675926,15,15,0,18,77,0,0,77,3,"3",1.5,2 +"phpdox",-1.0964679734,0.6066407752,-1.5664870339,"https://salsa.debian.org/php-team/pear/phpdox","https://github.com/theseer/phpdox",4604.8372800926,11,44,0,36,366,0,0,368,3,"3",1.8,1.9945652173913 +"phpLDAPadmin",0.9538106411,1.6007846261,0.5030751444,"https://salsa.debian.org/php-team/pear/phpldapadmin","https://github.com/leenooks/phpLDAPadmin",5264.4283796296,42,25,0,26,189,0,1,192,4,"4",1.37313432835821,1.984375 +"phploc",-0.6743294156,1.1227196643,-1.1328550897,"https://salsa.debian.org/php-team/pear/phploc","https://github.com/sebastianbergmann/phploc",5362.0425347222,18,31,0,38,226,0,0,226,4,"4",1.63265306122449,2 +"phpseclib",-0.073403609,1.2483282321,-0.3161589858,"https://salsa.debian.org/php-team/pear/phpseclib","https://github.com/phpseclib/phpseclib.git",5749.2331828704,80,98,0,135,155,0,5,268,4,"4",1.55056179775281,1.57835820895522 +"comparator",0.1016908786,2.3398889578,-0.3301518045,"https://salsa.debian.org/php-team/pear/phpunit-comparator","https://github.com/sebastianbergmann/comparator",3686.3957291667,20,9,0,25,105,0,0,105,2,"2",1.31034482758621,2 +"pidcat",-0.2348175331,2.8745190447,-1.069688066,"https://salsa.debian.org/python-team/packages/pidcat","https://github.com/JakeWharton/pidcat.git",3155.524837963,4,40,0,30,259,0,0,261,2,"2",1.90909090909091,1.99233716475096 +"Piexif",-0.8041956898,1.6330932338,-1.3844176603,"https://salsa.debian.org/python-team/packages/piexif","https://github.com/hMatoba/Piexif",3307.7984837963,5,12,0,10,155,0,0,155,2,"2",1.70588235294118,2 +"pipewalker",0.5020627732,3.1638761301,-0.3613058019,"https://salsa.debian.org/debian/pipewalker","https://github.com/artemsen/pipewalker",2088.9552662037,1,4,0,3,6,0,0,6,1,"1",1.8,2 +"pipexec",-0.2552786974,1.5523174274,-0.6883958099,"https://salsa.debian.org/alteholz/pipexec","https://github.com/flonatel/pipexec.git",3308.5569560185,0,11,0,6,12,0,0,13,2,"2",2,1.92307692307692 +"pk4",-1.8075865154,0.2000705346,-2.2307798324,"https://github.com/Debian/pk4","https://github.com/Debian/pk4",1044.0391203704,0,1,0,1,4,0,0,4,1,"1",2,2 +"pkcs11-helper",1.2104032601,4.0753663669,0.2461129198,"https://salsa.debian.org/opensc-team/pkcs11-helper","https://github.com/OpenSC/pkcs11-helper",5754.4088194445,16,2,0,13,58,0,3,61,4,"4",1.11111111111111,1.95081967213115 +"pkgconf",-0.0511523264,0.6206735889,-0.2703346973,"https://salsa.debian.org/debian/pkgconf","https://github.com/pkgconf/pkgconf",4516.657650463,52,29,1,67,201,0,9,219,3,"3",1.35802469135802,1.91780821917808 +"pktstat",2.3338787395,6.0502882403,0.926044188,"https://salsa.debian.org/debian/pktstat","https://github.com/dleonard0/pktstat",2938.7848958333,0,4,0,2,5,0,0,5,2,"2",2,2 +"planetblupi",-0.2798326789,2.3368636861,-0.892136731,"https://salsa.debian.org/games-team/planetblupi","https://github.com/blupi-games/planetblupi",2504.3208449074,5,7,1,9,18,0,0,20,1,"1",1.58333333333333,1.9 +"gmailfeed",-0.9078350467,1.5377434382,-1.4604242885,"https://salsa.debian.org/qt-kde-team/extras/plasma-gmailfeed","https://github.com/anthon38/gmailfeed.git",2727.0607638889,3,4,0,4,17,0,0,17,1,"1",1.57142857142857,2 +"plastex",0.2432695472,2.6132312475,-0.7011641781,"https://salsa.debian.org/python-team/packages/plastex","https://github.com/plastex/plastex",5539.2969907407,17,19,1,19,79,0,1,80,4,"4",1.52777777777778,1.9875 +"pngquant",0.5997315487,2.7135905645,-0.2341425934,"https://salsa.debian.org/debian-phototools-team/pngquant","https://github.com/kornelski/pngquant.git",4325.0383333333,23,38,0,41,383,0,0,386,3,"3",1.62295081967213,1.99222797927461 +"pngquant",0.7530300912,2.4617924213,0.0694002171,"https://salsa.debian.org/debian-phototools-team/pngquant","https://github.com/kornelski/pngquant.git",4325.0383333333,23,38,0,41,383,0,0,386,3,"3",1.62295081967213,1.99222797927461 +"pocketsphinx",-0.1321092966,0.4767106106,-0.3322064688,"https://salsa.debian.org/a11y-team/pocketsphinx","https://github.com/cmusphinx/pocketsphinx",5652.4787847222,5,30,2,19,191,0,5,206,4,"4",1.85714285714286,1.92718446601942 +"pocl",0.0943083762,0.5327681562,-0.1315933389,"https://salsa.debian.org/opencl-team/pocl","https://github.com/pocl/pocl",4689.6507291667,26,119,2,96,172,0,16,235,3,"3",1.82068965517241,1.73191489361702 +"popt",0.8457741179,1.4698340745,0.461614112,"https://salsa.debian.org/debian/popt","https://github.com/rpm-software-management/popt.git",5739.6746643519,38,10,0,43,33,0,0,60,4,"4",1.20833333333333,1.55 +"portalocker",-0.6761775694,1.2289979494,-1.0819015205,"https://salsa.debian.org/python-team/packages/portalocker","https://github.com/WoLpH/portalocker",4590.8550231482,5,21,0,17,76,0,0,76,3,"3",1.80769230769231,2 +"postfixadmin",1.3718594968,2.8225561724,0.562614351,"https://salsa.debian.org/debian/postfixadmin","https://github.com/postfixadmin/postfixadmin",5760.0218055556,53,77,1,94,124,0,0,183,4,"4",1.59230769230769,1.6775956284153 +"postgis-java",-0.2249511782,0.6204972087,-0.4368391732,"https://salsa.debian.org/debian-gis-team/postgis-java","https://github.com/postgis/postgis-java.git",5635.3241319445,8,12,0,15,32,0,1,39,4,"4",1.6,1.82051282051282 +"autodoc",0.4941840875,2.0445546371,-0.1932500455,"https://salsa.debian.org/debian/postgresql-autodoc","https://github.com/cbbrowne/autodoc.git",4575.8853587963,5,13,0,11,24,0,0,24,3,"3",1.72222222222222,2 +"pg_filedump",-0.6115611941,1.2319618721,-1.0974123114,"https://salsa.debian.org/postgresql/postgresql-filedump","https://github.com/df7cb/pg_filedump.git",4622.5029861111,3,6,0,6,19,0,0,21,3,"3",1.66666666666667,1.9047619047619 +"postgresql-hll",-1.5534816636,0.6872065961,-2.2881681018,"https://salsa.debian.org/postgresql/postgresql-hll","https://github.com/citusdata/postgresql-hll.git",3859.4959259259,23,21,0,27,124,0,0,126,3,"3",1.47727272727273,1.98412698412698 +"mysql_fdw",-1.2606174982,0.3226021522,-1.7176084858,"https://salsa.debian.org/postgresql/postgresql-mysql-fdw","https://github.com/EnterpriseDB/mysql_fdw.git",4475.7229861111,5,27,0,22,248,0,0,249,3,"3",1.84375,1.99598393574297 +"postgresql-numeral",-1.5134522364,1.6243431313,-2.293706422,"https://github.com/df7cb/postgresql-numeral","https://github.com/df7cb/postgresql-numeral",2361.1246527778,0,4,0,2,3,0,0,3,1,"1",2,2 +"plsh",-1.6026559782,-0.4185729412,-1.9028536338,"https://salsa.debian.org/postgresql/postgresql-plsh","https://github.com/petere/plsh.git",3969.9145023148,1,1,0,2,23,0,0,23,3,"3",1.5,2 +"postgrey",0.4162125811,0.8007795616,0.16790509,"https://salsa.debian.org/debian/postgrey","https://github.com/schweikert/postgrey.git",5469.9499074074,10,14,0,22,75,0,0,83,4,"4",1.58333333333333,1.90361445783133 +"postsrsd",0.10383995,2.0191274283,-0.4773257062,"https://salsa.debian.org/debian/postsrsd","https://github.com/roehling/postsrsd.git",4014.2085648148,10,17,0,4,30,0,0,33,3,"3",1.62962962962963,1.90909090909091 +"potool",-0.5814294404,0.0587787858,-0.834772415,"https://github.com/porridge/potool/tree/debian","https://github.com/porridge/potool",4430.2149884259,2,3,0,2,1,0,0,3,3,"3",1.6,1.33333333333333 +"povray",0.9584216742,1.6940449747,0.4892724706,"https://salsa.debian.org/debian/povray","https://github.com/POV-Ray/povray",2833.0740740741,8,15,7,14,45,0,2,50,2,"2",1.65217391304348,1.9 +"powa-archivist",-1.3322892717,0.6277535501,-1.7515157782,"https://github.com/powa-team/powa-archivist","https://github.com/powa-team/powa-archivist",3471.9301967593,10,15,2,15,40,0,0,42,2,"2",1.6,1.95238095238095 +"powercap",-0.3284328359,2.6169095108,-1.1283456001,"https://github.com/connorimes/powercap/tree/debian","https://github.com/connorimes/powercap",2525.9958912037,0,4,0,2,2,0,0,3,1,"1",2,1.66666666666667 +"pqiv",-0.1638813895,0.7585584788,-0.4540092183,"https://salsa.debian.org/pberndt-guest/pqiv","https://github.com/phillipberndt/pqiv",5604.8415509259,11,12,0,15,127,0,0,127,4,"4",1.52173913043478,2 +"prboom-plus",0.97864662,1.8842985584,0.4320575143,"https://salsa.debian.org/games-team/prboom-plus","https://github.com/coelckers/prboom-plus",5585.983912037,42,11,1,41,53,0,1,73,4,"4",1.20754716981132,1.72602739726027 +"primus",0.2729569091,1.2481073389,-0.1134531508,"https://salsa.debian.org/nvidia-team/primus","https://github.com/amonakov/primus",937.9013425926,3,6,0,6,216,0,0,216,1,"1",1.66666666666667,2 +"bird_exporter",-3.477178786,-0.0329330544,-4.2892202007,"https://salsa.debian.org/go-team/packages/prometheus-bird-exporter","https://github.com/czerwonk/bird_exporter",2542.4624768519,10,16,6,19,56,0,0,57,1,"1",1.61538461538462,1.98245614035088 +"haproxy_exporter",-3.8607213348,-2.0700503351,-4.3161894613,"https://salsa.debian.org/go-team/packages/prometheus-haproxy-exporter","https://github.com/prometheus/haproxy_exporter",3672.0941203704,21,40,0,41,166,0,0,171,2,"2",1.65573770491803,1.97076023391813 +"postfix_exporter",-2.309018579,-0.0678780093,-2.9354675488,"https://salsa.debian.org/go-team/packages/prometheus-postfix-exporter","https://github.com/kumina/postfix_exporter",2274.256712963,7,24,0,20,129,0,0,130,1,"1",1.7741935483871,1.99230769230769 +"pushgateway",-0.8937395968,2.0265228669,-1.5977918562,"https://salsa.debian.org/go-team/packages/prometheus-pushgateway","https://github.com/prometheus/pushgateway",3606.187337963,18,76,1,58,280,0,0,292,2,"2",1.80851063829787,1.95890410958904 +"proot-debian",1.0920103364,3.4894212371,0.1526188422,"https://github.com/ivoire/proot-debian","https://github.com/ivoire/proot-debian",508.0834837963,0,2,0,1,3,0,0,3,1,"1",2,2 +"prospector",-0.1396414973,2.1237521604,-0.9708127034,"https://salsa.debian.org/python-team/packages/prospector","https://github.com/PyCQA/prospector",3767.6942939815,36,66,2,76,313,0,0,327,2,"2",1.64705882352941,1.95718654434251 +"ps2eps",1.532120796,4.5656897613,0.4495361846,"https://salsa.debian.org/debian/ps2eps","https://github.com/roland-bless/ps2eps.git",0.1197453704,1,2,0,1,1,0,0,2,1,"1",1.66666666666667,1.5 +"psad",-0.1576432836,0.28089801,-0.427371641,"https://salsa.debian.org/debian/psad","https://github.com/mrash/psad/commits/master",5185.326875,55,11,0,0,0,0,0,0,4,"4",1.16666666666667,NA +"pudb",0.5652873271,3.503587652,-0.3825137639,"https://salsa.debian.org/debian/pudb","https://github.com/inducer/pudb.git",5292.8559490741,32,73,0,84,306,0,0,318,4,"4",1.6952380952381,1.9622641509434 +"puppetlabs-ntp",-1.6019329854,0.0840048992,-1.9766118562,"https://salsa.debian.org/puppet-team/puppet-module-puppetlabs-ntp","https://github.com/puppetlabs/puppetlabs-ntp.git",4661.5050231482,40,171,0,118,228,0,0,234,3,"3",1.81042654028436,1.97435897435897 +"py-lmdb",-0.075515578,2.3670377588,-0.9569815252,"https://salsa.debian.org/debian/py-lmdb","https://github.com/jnwatson/py-lmdb",3712.4741898148,18,23,0,26,205,0,0,207,2,"2",1.5609756097561,1.99033816425121 +"fe",0.0569254607,2.238596245,-0.7405534191,"https://salsa.debian.org/python-team/packages/py-postgresql","https://github.com/python-postgres/fe",5231.8056712963,1,11,0,5,69,0,0,69,4,"4",1.91666666666667,2 +"py-radix",-0.2347152131,1.2849195969,-0.668352957,"https://salsa.debian.org/python-team/packages/py-radix","https://github.com/mjschultz/py-radix",1374.4915856482,3,11,0,9,39,0,0,40,1,"1",1.78571428571429,1.975 +"py-ubjson",0.3258683606,2.3051690362,-0.1923435128,"https://salsa.debian.org/python-team/packages/py-ubjson","https://github.com/Iotic-Labs/py-ubjson",2987.1609027778,3,4,0,5,12,0,0,13,2,"2",1.57142857142857,1.92307692307692 +"pycairo",1.8611353266,3.0551049835,1.1479506832,"https://salsa.debian.org/python-team/packages/pycairo","https://github.com/pygobject/pycairo",2389.8532175926,13,23,2,28,234,0,0,236,1,"1",1.63888888888889,1.99152542372881 +"pychm",0.1959778752,1.6504366967,-0.1847897986,"https://salsa.debian.org/python-team/packages/pychm","https://github.com/dottedmag/pychm.git",3381.7747222222,2,4,0,3,19,0,0,19,2,"2",1.66666666666667,2 +"pychromecast",0.0550333172,1.8645058973,-0.3583381658,"https://salsa.debian.org/python-team/packages/pychromecast","https://github.com/home-assistant-libs/pychromecast.git",3717.1753935185,57,30,0,74,318,0,0,345,2,"2",1.3448275862069,1.92173913043478 +"pycoast",-0.9264089102,1.0445653141,-1.3282069805,"https://salsa.debian.org/debian-gis-team/pycoast","https://github.com/pytroll/pycoast",3185.132662037,7,21,0,12,29,0,0,30,2,"2",1.75,1.96666666666667 +"pydenticon",-0.865220641,1.8522581651,-1.5367272325,"https://salsa.debian.org/python-team/packages/pydenticon","https://github.com/azaghal/pydenticon",1376.6938657407,2,1,0,2,13,0,0,13,1,"1",1.33333333333333,2 +"pydicom",0.3543730908,1.939756419,-0.1871292016,"https://salsa.debian.org/med-team/pydicom","https://github.com/pydicom/pydicom.git",5576.1416435185,69,58,0,87,155,0,4,210,4,"4",1.45669291338583,1.73809523809524 +"pydocstyle",0.5531580789,3.8832816133,-0.434312514,"https://salsa.debian.org/python-team/packages/pydocstyle","https://github.com/PyCQA/pydocstyle.git",4295.4277893519,58,44,0,86,381,0,0,394,3,"3",1.43137254901961,1.96700507614213 +"PyHamcrest",0.4770044067,2.0276091701,-0.0667553805,"https://salsa.debian.org/python-team/packages/pyhamcrest","https://github.com/hamcrest/PyHamcrest",5756.5347222222,18,36,0,32,112,0,0,113,4,"4",1.66666666666667,1.99115044247788 +"pylama",-0.1685043243,2.3124561576,-0.8358206635,"https://salsa.debian.org/python-team/packages/pylama","https://github.com/klen/pylama",3643.0438888889,6,46,0,37,127,0,0,134,2,"2",1.88461538461538,1.94776119402985 +"pylast",0.1007769388,2.2899648047,-0.3798195506,"https://salsa.debian.org/python-team/packages/pylast","https://github.com/pylast/pylast",5565.5985532407,8,38,2,32,125,0,0,130,4,"4",1.82608695652174,1.96153846153846 +"pylibtiff",0.0190555879,2.1644424074,-0.7692360791,"https://salsa.debian.org/debian-gis-team/pylibtiff","https://github.com/pearu/pylibtiff.git",3040.1433796296,10,20,0,22,100,0,1,103,2,"2",1.66666666666667,1.97087378640777 +"pymca",-0.4153476895,-0.1437047675,-0.5016872933,"https://salsa.debian.org/science-team/pymca","https://github.com/vasole/pymca",5785.8055439815,7,32,0,17,52,0,0,52,4,"4",1.82051282051282,2 +"pymediainfo",0.3813327313,2.7232285427,-0.3112268398,"https://salsa.debian.org/python-team/packages/pymediainfo","https://github.com/sbraz/pymediainfo",4970.7511111111,10,7,0,12,111,0,0,112,3,"3",1.41176470588235,1.99107142857143 +"pymodbus",0.0732799109,1.8646692265,-0.5844401794,"https://salsa.debian.org/python-team/packages/pymodbus","https://github.com/pymodbus-dev/pymodbus.git",5499.738599537,102,63,0,125,552,0,0,603,4,"4",1.38181818181818,1.91542288557214 +"pyopencl",0.1782677537,0.865226367,-0.1694455174,"https://salsa.debian.org/opencl-team/python-pyopencl","https://github.com/inducer/pyopencl",5374.16875,28,83,0,77,238,0,0,251,4,"4",1.74774774774775,1.94820717131474 +"pyorbital",-0.835136266,1.1503801119,-1.2127768903,"https://salsa.debian.org/debian-gis-team/pyorbital","https://github.com/pytroll/pyorbital.git",4467.5734606482,9,33,0,26,73,0,0,75,3,"3",1.78571428571429,1.97333333333333 +"pypuppetdb",-1.329401636,2.4185219671,-2.4698360721,"https://salsa.debian.org/python-team/packages/pypuppetdb","https://github.com/voxpupuli/pypuppetdb",3781.8189814815,18,46,2,46,103,0,0,106,3,"3",1.71875,1.97169811320755 +"pyqi",-0.6659052808,0.4267300657,-0.9064389106,"https://salsa.debian.org/med-team/pyqi","https://github.com/biocore/pyqi",1051.0106481482,0,13,1,7,17,0,0,17,1,"1",2,2 +"pyquery",0.2533160207,2.1476722718,-0.276904445,"https://salsa.debian.org/python-team/packages/pyquery","https://github.com/gawel/pyquery.git",5354.1741550926,7,50,0,45,213,0,0,222,4,"4",1.87719298245614,1.95945945945946 +"pysodium",-0.9250342629,1.6337160906,-1.6304178321,"https://salsa.debian.org/python-team/packages/pysodium","https://github.com/stef/pysodium.git",3761.6783217593,9,38,0,33,63,0,0,66,2,"2",1.80851063829787,1.95454545454545 +"python-soundfile",-0.4259563033,1.9817809485,-0.87334628,"https://salsa.debian.org/multimedia-team/pysoundfile","https://github.com/bastibe/python-soundfile.git",3757.2281481482,8,31,0,27,287,0,0,287,2,"2",1.7948717948718,2 +"pysph",-0.1957650825,0.8352828367,-0.6085553873,"https://salsa.debian.org/science-team/pysph","https://github.com/pypr/pysph",3944.0042824074,12,53,0,27,60,0,0,66,3,"3",1.81538461538462,1.90909090909091 +"pysrs",-2.5865636963,-0.2466583264,-3.0140171336,"https://salsa.debian.org/python-team/packages/pysrs","https://github.com/sdgathman/pysrs.git",5232.0373842593,2,4,0,2,7,0,0,7,4,"4",1.66666666666667,2 +"pyssim",-1.4493782429,1.5830189811,-2.3198514231,"https://salsa.debian.org/python-team/packages/pyssim","https://github.com/jterrace/pyssim",4069.879375,2,12,0,7,3,0,0,8,3,"3",1.85714285714286,1.375 +"PyStaticConfiguration",-2.0472160299,0.7630493618,-2.7265555606,"https://salsa.debian.org/python-team/packages/pystaticconfiguration","https://github.com/dnephin/PyStaticConfiguration",3745.7102662037,3,26,2,20,44,0,0,45,2,"2",1.89655172413793,1.97777777777778 +"pysubnettree",-0.9461476097,1.2999152117,-1.5398813128,"https://salsa.debian.org/python-team/packages/pysubnettree","https://github.com/zeek/pysubnettree.git",4655.7478587963,1,18,0,11,28,0,0,30,3,"3",1.94736842105263,1.93333333333333 +"pytest-arraydiff",0.1898441175,2.3416228263,-0.2394386956,"https://salsa.debian.org/python-team/packages/pytest-arraydiff","https://github.com/astrofrog/pytest-arraydiff",2688.582349537,5,12,0,11,0,0,0,11,1,"1",1.70588235294118,1 +"pytest-bdd",-3.4287681139,-0.5039458847,-4.2303785564,"https://salsa.debian.org/python-team/packages/pytest-bdd","https://github.com/pytest-dev/pytest-bdd.git",3909.5599768519,26,45,0,50,355,0,0,365,3,"3",1.63380281690141,1.97260273972603 +"pytest-expect",-1.4175585643,1.7604433826,-2.2515689023,"https://salsa.debian.org/python-team/packages/pytest-expect","https://github.com/gsnedders/pytest-expect",1755.9376273148,2,3,0,2,13,0,0,13,1,"1",1.6,2 +"pytest-pylint",-0.8320096401,0.1532890227,-1.1006353608,"https://salsa.debian.org/python-team/packages/pytest-pylint","https://github.com/carsongee/pytest-pylint",3089.6046180556,5,20,0,19,97,0,0,97,2,"2",1.8,2 +"pytest-remotedata",0.030168843,1.6486281266,-0.2466155852,"https://salsa.debian.org/python-team/packages/pytest-remotedata","https://github.com/astropy/pytest-remotedata",4372.8560069445,4,28,1,27,27,0,1,44,3,"3",1.875,1.61363636363636 +"pytest-sugar",-1.9343898664,0.0895529374,-2.5336128329,"https://salsa.debian.org/python-team/packages/pytest-sugar","https://github.com/Teemu/pytest-sugar.git",3774.5057060185,13,48,0,45,191,0,0,199,3,"3",1.78688524590164,1.95979899497487 +"py-amqp",0.4927928639,2.9780373711,-0.1037801308,"https://salsa.debian.org/python-team/packages/python-amqp","https://github.com/celery/py-amqp.git",5725.5644791667,68,43,0,82,220,0,0,249,4,"4",1.38738738738739,1.88353413654618 +"argh",0.2339030674,2.0159100899,-0.2686508718,"https://salsa.debian.org/python-team/packages/python-argh","https://github.com/neithere/argh.git",4744.0471875,5,24,0,22,102,0,0,107,3,"3",1.82758620689655,1.95327102803738 +"asyncssh",-1.1827053689,0.2562433063,-1.6493196582,"https://salsa.debian.org/python-team/packages/python-asyncssh","https://github.com/ronf/asyncssh",3723.8668634259,18,9,0,23,71,0,0,87,2,"2",1.33333333333333,1.81609195402299 +"python-atomicwrites",0.8071747449,3.936888395,-0.0360579534,"https://salsa.debian.org/python-team/packages/python-atomicwrites","https://github.com/untitaker/python-atomicwrites",2718.0744907407,9,8,0,15,53,0,0,53,1,"1",1.47058823529412,2 +"avro",-0.6764070684,0.594195245,-0.9704692662,"https://salsa.debian.org/python-team/packages/python-avro","https://github.com/apache/avro",5362.5630555556,342,76,0,310,0,0,0,310,4,"4",1.18181818181818,1 +"aws-xray-sdk-python",-0.6565672961,2.2186104229,-1.3887187484,"https://salsa.debian.org/science-team/python-aws-xray-sdk","https://github.com/aws/aws-xray-sdk-python",2264.9942939815,64,31,0,69,93,0,0,126,1,"1",1.32631578947368,1.73809523809524 +"azure-python-devtools",-1.8877692262,1.0407212341,-2.6897741774,"https://salsa.debian.org/python-team/packages/python-azure-devtools","https://github.com/Azure/azure-python-devtools",1688.8337962963,6,14,0,12,28,0,0,31,1,"1",1.7,1.90322580645161 +"b2-sdk-python",-2.7091203496,0.0195888217,-3.2985895116,"https://salsa.debian.org/python-team/packages/python-b2sdk","https://github.com/Backblaze/b2-sdk-python.git",2948.6294907407,24,86,0,77,61,0,0,112,2,"2",1.78181818181818,1.54464285714286 +"babel",0.4571086267,1.1252224199,0.1143783436,"https://salsa.debian.org/python-team/packages/python-babel","https://github.com/python-babel/babel",5776.7216782407,75,93,2,137,127,0,0,236,4,"4",1.55357142857143,1.53813559322034 +"base58",-0.6380025418,1.8870432293,-1.1948721512,"https://salsa.debian.org/python-team/packages/python-base58","https://github.com/keis/base58",3504.7240046296,9,12,0,15,37,0,0,38,2,"2",1.57142857142857,1.97368421052632 +"bayespy",-0.4133726859,2.2939543254,-1.2809021253,"https://salsa.debian.org/science-team/python-bayespy","https://github.com/bayespy/bayespy",4227.6050231482,4,9,0,7,68,0,0,68,3,"3",1.69230769230769,2 +"bcrypt",0.720872399,2.4323524124,0.0873154337,"https://salsa.debian.org/python-team/packages/python-bcrypt","https://github.com/pyca/bcrypt.git",3870.0652083333,26,10,0,30,196,0,0,198,3,"3",1.27777777777778,1.98989898989899 +"python-blosc",0.4104792893,2.7209909901,-0.2401314247,"https://salsa.debian.org/python-team/packages/python-blosc","https://github.com/Blosc/python-blosc.git",4736.2912268519,17,36,0,37,120,0,0,121,3,"3",1.67924528301887,1.99173553719008 +"boltons",-0.0997518599,2.672673187,-0.8614154477,"https://salsa.debian.org/python-team/packages/python-boltons","https://github.com/mahmoud/boltons",3938.2483333333,42,55,0,73,206,0,0,206,3,"3",1.56701030927835,2 +"bumps",-0.8935367246,0.0933032097,-1.1605313205,"https://salsa.debian.org/science-team/python-bumps","https://github.com/bumps/bumps",4409.9511574074,1,19,0,10,22,0,0,24,3,"3",1.95,1.91666666666667 +"cachetools",0.5221597712,3.3731185733,-0.2589146292,"https://salsa.debian.org/python-team/packages/python-cachetools","https://github.com/tkem/cachetools",3511.0841203704,2,11,0,11,206,0,0,206,2,"2",1.84615384615385,2 +"certbot",-2.2720142983,0.1157477766,-2.775909363,"https://salsa.debian.org/letsencrypt-team/certbot/certbot-dns-dnsimple","https://github.com/certbot/certbot.git",4226.9669907407,268,343,0,391,635,0,143,1074,3,"3",1.56137479541735,1.59124767225326 +"certbot",-0.8998199839,1.9089794558,-1.5782805062,"https://salsa.debian.org/letsencrypt-team/certbot/certbot-dns-google","https://github.com/certbot/certbot.git",4226.9669907407,268,343,0,391,635,0,143,1074,3,"3",1.56137479541735,1.59124767225326 +"certbot",-0.2811377468,1.8247084979,-0.7514361439,"https://salsa.debian.org/letsencrypt-team/certbot/certbot-dns-rfc2136","https://github.com/certbot/certbot.git",4226.9669907407,268,343,0,391,635,0,143,1074,3,"3",1.56137479541735,1.59124767225326 +"certbot",-1.1000615706,1.1834717942,-1.6727445902,"https://salsa.debian.org/letsencrypt-team/certbot/certbot-dns-route53","https://github.com/certbot/certbot.git",4226.9669907407,268,343,0,391,635,0,143,1074,3,"3",1.56137479541735,1.59124767225326 +"cmarkgfm",-1.3150135933,1.231941831,-1.8951479522,"https://salsa.debian.org/python-team/packages/python-cmarkgfm","https://github.com/theacodes/cmarkgfm",1977.4600578704,18,8,0,20,50,0,0,50,1,"1",1.30769230769231,2 +"colorama",0.7784754841,2.4846627407,0.147974244,"https://salsa.debian.org/python-team/packages/python-colorama","https://github.com/tartley/colorama",3514.6796527778,15,42,0,45,341,0,1,348,2,"2",1.73684210526316,1.97988505747126 +"python-colorlog",0.0760601286,2.176247301,-0.417655582,"https://salsa.debian.org/python-team/packages/python-colorlog","https://github.com/borntyping/python-colorlog.git",4104.9554398148,10,24,0,30,43,0,0,56,3,"3",1.70588235294118,1.76785714285714 +"colormap",-0.8079814337,1.468837378,-1.3890414287,"https://salsa.debian.org/python-team/packages/python-colormap","https://github.com/cokelaer/colormap",3308.9144444445,1,7,0,6,15,0,0,15,2,"2",1.875,2 +"pythonfutures",0.253069403,1.4926901749,-0.0680161382,"https://salsa.debian.org/python-team/modules/python-concurrent.futures","https://github.com/agronholm/pythonfutures.git",4929.1742592593,10,12,0,14,86,0,0,86,3,"3",1.54545454545455,2 +"ConfigArgParse",0.6238780174,3.3511057459,-0.0441913435,"https://salsa.debian.org/python-team/packages/configargparse","https://github.com/bw2/ConfigArgParse",3315.6581828704,8,51,0,44,239,0,1,240,2,"2",1.86440677966102,1.99583333333333 +"css-parser",0.7375204292,3.6525325545,-0.047073823,"https://salsa.debian.org/python-team/packages/python-css-parser","https://github.com/ebook-utils/css-parser",1765.7022685185,2,7,0,7,11,0,0,11,1,"1",1.77777777777778,2 +"cssselect",0.7663890486,3.666235057,-0.0218050513,"https://salsa.debian.org/python-team/packages/python-cssselect","https://github.com/scrapy/cssselect",5713.5145601852,8,23,0,24,65,0,1,68,4,"4",1.74193548387097,1.95588235294118 +"pycups",0.7229281241,2.1065141416,0.1579248085,"https://salsa.debian.org/python-team/packages/python-cups","https://github.com/OpenPrinting/pycups.git",5524.6673842593,4,9,0,9,62,0,1,68,4,"4",1.69230769230769,1.91176470588235 +"curtsies",0.3166501906,2.6067653967,-0.304611589,"https://salsa.debian.org/sramacher/python-curtsies","https://github.com/bpython/curtsies",3799.8890277778,15,32,1,35,70,0,0,73,3,"3",1.68085106382979,1.95890410958904 +"cycler",0.6283830281,2.4968734847,0.0195972629,"https://salsa.debian.org/python-team/packages/python-cycler","https://github.com/matplotlib/cycler",2790.0141087963,6,19,2,21,28,0,0,35,2,"2",1.76,1.8 +"cytoolz",-0.3584848,2.3538098789,-1.0758303941,"https://salsa.debian.org/python-team/packages/python-cytoolz","https://github.com/pytoolz/cytoolz",3395.421412037,2,21,0,16,68,0,0,71,2,"2",1.91304347826087,1.95774647887324 +"python-darkslide",0.9320448351,4.4954117391,-0.2883231751,"https://salsa.debian.org/debian/darkslide","https://github.com/ionelmc/python-darkslide.git",4282.7612268519,4,56,0,42,23,0,0,55,3,"3",1.93333333333333,1.41818181818182 +"DartsPyLRU",-1.8927494334,0.2922334772,-2.3461638638,"https://salsa.debian.org/pkg-security-team/python-darts.lib.utils.lru","https://github.com/deterministic-arts/DartsPyLRU.git",362.9079398148,0,2,0,1,5,0,0,5,1,"1",2,2 +"datrie",-0.50605789,1.3803188391,-0.9784823552,"https://salsa.debian.org/python-team/packages/python-datrie","https://github.com/kmike/datrie.git",2978.6536226852,7,11,0,14,90,0,2,92,2,"2",1.61111111111111,1.97826086956522 +"python-dbusmock",-0.627944788,0.3000038238,-0.8505709773,"https://salsa.debian.org/python-team/packages/python-dbusmock","https://github.com/martinpitt/python-dbusmock",4100.7724189815,32,16,0,31,57,0,0,63,3,"3",1.33333333333333,1.9047619047619 +"decorator",0.4704212561,1.7923957087,0.0135959484,"https://salsa.debian.org/python-team/packages/python-decorator","https://github.com/micheles/decorator.git",5376.3999537037,6,23,0,23,131,0,0,131,4,"4",1.79310344827586,2 +"django-braces",-1.2510273472,0.3406489189,-1.6388153686,"https://salsa.debian.org/python-team/packages/python-django-braces","https://github.com/brack3t/django-braces.git",4108.7193865741,10,79,0,65,196,0,0,196,3,"3",1.8876404494382,2 +"django-cas",-1.1534352121,1.6719173633,-2.0695177654,"https://salsa.debian.org/python-team/packages/python-django-casclient","https://github.com/kstateome/django-cas",2792.0546875,7,19,0,16,53,0,0,54,2,"2",1.73076923076923,1.98148148148148 +"django-extra-views",-1.2587713718,1.08523072,-1.8662212132,"https://salsa.debian.org/python-team/packages/python-django-extra-views","https://github.com/AndrewIngram/django-extra-views",4072.4001041667,12,61,1,51,205,0,0,208,3,"3",1.83561643835616,1.98557692307692 +"django-imagekit",-1.3510241486,0.3749851789,-1.7864034212,"https://salsa.debian.org/python-team/packages/python-django-imagekit","https://github.com/matthewwithanm/django-imagekit.git",5386.1103935185,18,69,0,65,458,0,0,463,4,"4",1.79310344827586,1.98920086393089 +"django-modelcluster",-3.9620317451,-2.0344269896,-4.3414266404,"https://salsa.debian.org/python-team/packages/python-django-modelcluster","https://github.com/wagtail/django-modelcluster.git",3534.2000347222,21,13,0,29,118,0,0,119,2,"2",1.38235294117647,1.99159663865546 +"django-rest-framework-guardian",-3.3209075154,-1.1464196518,-3.751236078,"https://salsa.debian.org/python-team/packages/python-django-rest-framework-guardian","https://github.com/rpkilby/django-rest-framework-guardian.git",626.7550231481,2,4,0,4,14,0,0,14,1,"1",1.66666666666667,2 +"django-rest-hooks",-1.5050875724,1.1869723949,-2.1906025512,"https://salsa.debian.org/python-team/packages/python-django-rest-hooks","https://github.com/zapier/django-rest-hooks",2693.6027777778,12,13,0,20,56,0,0,57,1,"1",1.52,1.98245614035088 +"django-split-settings",-2.7895751152,-0.3987847133,-3.3101515707,"https://salsa.debian.org/python-team/packages/python-django-split-settings","https://github.com/sobolevn/django-split-settings",3860.1584027778,17,13,0,20,39,0,0,46,3,"3",1.43333333333333,1.84782608695652 +"django-storages",-3.1386978641,-0.5967779923,-3.725863839,"https://salsa.debian.org/python-team/packages/python-django-storages","https://github.com/jschneier/django-storages.git",4486.1115740741,175,96,0,225,717,0,2,835,3,"3",1.35424354243542,1.85868263473054 +"django-treebeard",-1.4430134685,-0.7351656258,-1.6842741632,"https://salsa.debian.org/python-team/packages/python-django-treebeard","https://github.com/django-treebeard/django-treebeard.git",5493.911400463,24,59,0,65,267,0,0,278,4,"4",1.71084337349398,1.96043165467626 +"python-dmidecode",0.6965127554,2.3773186195,-0.1244349613,"https://salsa.debian.org/python-team/packages/python-dmidecode","https://github.com/nima/python-dmidecode",5342.5758333333,10,17,0,11,26,0,0,28,4,"4",1.62962962962963,1.92857142857143 +"dnsq",-0.8493777922,1.6513810932,-1.4106021621,"https://salsa.debian.org/python-team/packages/python-dnsq","https://github.com/mailgun/dnsq.git",1028.9045138889,1,6,0,4,14,0,0,15,1,"1",1.85714285714286,1.93333333333333 +"python-dotenv",-0.0646647075,2.8616640278,-0.9758026604,"https://salsa.debian.org/debian/python-dotenv","https://github.com/theskumar/python-dotenv.git",3676.0798726852,81,18,0,84,565,0,1,569,2,"2",1.18181818181818,1.99297012302285 +"dpkt",0.019610667,2.4762696052,-0.5848881328,"https://salsa.debian.org/python-team/packages/python-dpkt","https://github.com/kbandla/dpkt",3886.9183680556,36,43,1,56,220,0,1,222,3,"3",1.54430379746835,1.99099099099099 +"dropbox-sdk-python",-0.1301813578,2.8452134881,-0.8655819935,"https://salsa.debian.org/python-team/packages/python-dropbox","https://github.com/dropbox/dropbox-sdk-python",2984.0770833333,28,31,0,31,49,0,0,71,2,"2",1.52542372881356,1.69014084507042 +"python-dugong",-0.5914713911,0.3761740468,-0.8252986097,"https://salsa.debian.org/python-team/packages/python-dugong","https://github.com/python-dugong/python-dugong.git",3200.2688541667,4,5,0,7,9,0,0,11,2,"2",1.55555555555556,1.81818181818182 +"easydev",-1.0634186539,0.4092421308,-1.417126244,"https://salsa.debian.org/python-team/packages/python-easydev","https://github.com/cokelaer/easydev.git",3717.344375,0,5,0,1,10,0,0,10,2,"2",2,2 +"easywebdav",-0.193448412,1.9590581698,-0.6371910366,"https://salsa.debian.org/python-team/packages/python-easywebdav","https://github.com/amnong/easywebdav",813.3765625,1,13,0,8,75,0,0,75,1,"1",1.92857142857143,2 +"exif-py",0.0156493175,1.0036035588,-0.2489350249,"https://salsa.debian.org/python-team/packages/python-exif","https://github.com/ianare/exif-py",3998.0291898148,34,23,0,51,195,0,0,195,3,"3",1.40350877192982,2 +"fabio",0.0104950221,1.2100758664,-0.4380511126,"https://salsa.debian.org/science-team/python-fabio","https://github.com/silx-kit/fabio.git",5765.1214351852,18,45,0,33,54,0,0,60,4,"4",1.71428571428571,1.9 +"fitsio",-0.4610557174,0.3940574407,-0.637876907,"https://salsa.debian.org/debian-astro-team/python-fitsio","https://github.com/esheldon/fitsio",4439.4105671296,4,32,0,25,107,0,0,108,3,"3",1.88888888888889,1.99074074074074 +"flaky",-0.8238726702,2.0811606782,-1.6526698831,"https://salsa.debian.org/python-team/packages/python-flaky","https://github.com/box/flaky.git",3089.6002083333,11,23,0,21,145,0,0,145,2,"2",1.67647058823529,2 +"fysom",-0.7585603333,1.38289184,-1.1858234109,"https://salsa.debian.org/debian/python-fysom","https://github.com/mriehl/fysom.git",3641.9876967593,3,22,0,13,39,0,0,40,2,"2",1.88,1.975 +"geneimpacts",-1.8069134623,0.4508156575,-2.2387477164,"https://salsa.debian.org/med-team/python-geneimpacts","https://github.com/brentp/geneimpacts/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA +"genty",-1.5312416046,1.7202436984,-2.3792600782,"https://salsa.debian.org/python-team/packages/python-genty","https://github.com/box/genty.git",701.8032986111,0,10,0,5,15,0,0,15,1,"1",2,2 +"glad",-1.3457272309,1.093467749,-1.9015379081,"https://salsa.debian.org/python-team/packages/glad","https://github.com/Dav1dde/glad.git",3530.1536458333,54,19,0,28,255,0,3,266,2,"2",1.26027397260274,1.95864661654135 +"python-gnupg",0.3458917214,1.220869917,-0.050061794,"https://salsa.debian.org/python-team/packages/python-gnupg","https://github.com/vsajip/python-gnupg.git",3594.9863773148,6,12,0,14,52,0,0,58,2,"2",1.66666666666667,1.89655172413793 +"gnuplotlib",-0.5540723096,1.9911774543,-1.1225767623,"https://salsa.debian.org/python-team/packages/python-gnuplotlib","https://github.com/dkogan/gnuplotlib",3062.559849537,1,2,0,2,29,0,0,29,2,"2",1.66666666666667,2 +"graphviz",-0.2775267395,1.2889253499,-0.6503415057,"https://salsa.debian.org/python-team/packages/python-graphviz","https://github.com/xflr6/graphviz",3612.6320833333,12,12,0,22,48,0,0,60,2,"2",1.5,1.8 +"greenlet",0.8047616843,1.7061049423,0.3070462935,"https://salsa.debian.org/python-team/packages/python-greenlet","https://github.com/python-greenlet/greenlet",5315.6529166667,21,53,1,60,350,0,0,351,4,"4",1.71621621621622,1.997150997151 +"python-gssapi",0.3289179765,2.3550255223,-0.2500485627,"https://salsa.debian.org/python-team/packages/python-gssapi","https://github.com/pythongssapi/python-gssapi",3263.0338078704,18,17,0,25,97,0,0,99,2,"2",1.48571428571429,1.97979797979798 +"h11",0.0628463609,2.5298903305,-0.3966248627,"https://salsa.debian.org/python-team/packages/python-h11","https://github.com/python-hyper/h11.git",2700.4708217593,21,14,0,28,99,0,0,99,1,"1",1.4,2 +"httplib2",0.5220301337,1.5281004855,0.118057713,"https://salsa.debian.org/python-team/packages/python-httplib2","https://github.com/httplib2/httplib2.git",5422.7818402778,50,36,0,58,150,0,9,186,4,"4",1.41860465116279,1.80645161290323 +"httptools",-1.016257232,1.5255190337,-1.6306842731,"https://salsa.debian.org/python-team/packages/python-httptools","https://github.com/MagicStack/httptools.git",2908.9019444445,11,7,0,15,96,0,0,97,2,"2",1.38888888888889,1.98969072164948 +"idna",0.428827323,2.3998733008,0.0023232441,"https://salsa.debian.org/python-team/packages/python-idna","https://github.com/kjd/idna",3836.1993865741,12,16,2,22,107,0,0,107,3,"3",1.57142857142857,2 +"ijson",-0.7882494907,1.6183503032,-1.3435678266,"https://salsa.debian.org/debian/python-ijson","https://github.com/ICRAR/ijson.git",4844.9471180556,7,21,0,19,91,0,0,100,3,"3",1.75,1.91 +"intervaltree-bio",-0.5864931947,1.6648991521,-1.1805901394,"https://salsa.debian.org/med-team/python-intervaltree-bio","https://github.com/konstantint/intervaltree-bio.git",961.9282638889,0,5,0,4,7,0,0,7,1,"1",2,2 +"ipaddr-py",0.6433933144,3.2903739444,-0.0419910302,"https://salsa.debian.org/python-team/modules/python-ipaddr","https://github.com/google/ipaddr-py/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA +"ipaddress",0.6123592223,3.1947690745,-0.0003839016,"https://salsa.debian.org/python-team/modules/python-ipaddress","https://github.com/phihag/ipaddress",2728.476099537,1,7,0,6,56,0,0,56,1,"1",1.875,2 +"python-ipcalc",0.7141016308,3.4398389904,-0.255334424,"https://github.com/craneworks/python-ipcalc","https://github.com/craneworks/python-ipcalc",756.8280324074,1,1,0,0,1,0,0,1,1,"1",1.5,2 +"python-iptables",-1.3768945792,-0.1620145007,-1.5972298957,"https://salsa.debian.org/python-team/packages/python-iptables","https://github.com/ldx/python-iptables",4469.2364236111,3,51,0,40,238,0,0,240,3,"3",1.94444444444444,1.99166666666667 +"python-isc-dhcp-leases",-1.2144164676,1.3723753572,-1.7887539722,"https://salsa.debian.org/python-team/packages/python-isc-dhcp-leases","https://github.com/MartijnBraam/python-isc-dhcp-leases",3184.8126041667,4,9,0,8,31,0,0,31,2,"2",1.69230769230769,2 +"itsdangerous",0.6642302819,3.2169189216,-0.0415160477,"https://salsa.debian.org/python-team/packages/python-itsdangerous","https://github.com/pallets/itsdangerous",4546.9291435185,24,19,0,40,182,0,0,188,3,"3",1.44186046511628,1.96808510638298 +"jellyfish",0.0674101012,2.0051276836,-0.4205869787,"https://salsa.debian.org/python-team/packages/python-jellyfish","https://github.com/jamesturk/jellyfish",4902.3308101852,15,24,0,27,148,0,0,148,3,"3",1.61538461538462,2 +"jira",-0.3980829938,2.423176583,-1.0411208861,"https://salsa.debian.org/python-team/packages/python-jira","https://github.com/pycontribs/jira",4267.40125,111,155,3,195,572,0,0,670,3,"3",1.58270676691729,1.85373134328358 +"jmespath.py",0.3629172949,2.0686645362,-0.1003834425,"https://salsa.debian.org/python-team/packages/python-jmespath","https://github.com/jmespath/jmespath.py",3691.1897222222,12,21,0,28,14,0,1,37,2,"2",1.63636363636364,1.37837837837838 +"josepy",0.3513511179,2.2923963637,-0.0869215969,"https://salsa.debian.org/letsencrypt-team/certbot/josepy","https://github.com/certbot/josepy",4184.7847685185,104,276,0,285,46,0,0,308,3,"3",1.72631578947368,1.14935064935065 +"python-junit-xml",-0.4874384495,3.2461576764,-1.4580304291,"https://salsa.debian.org/python-team/packages/python-junit-xml","https://github.com/kyrus/python-junit-xml.git",2595.0297685185,5,18,0,13,67,0,0,69,1,"1",1.78260869565217,1.97101449275362 +"kajiki",-2.3594950912,-1.2299434314,-2.6159157482,"https://salsa.debian.org/python-team/packages/python-kajiki","https://github.com/jackrosenthal/kajiki",4546.9668518519,3,22,0,18,30,0,0,33,3,"3",1.88,1.90909090909091 +"kaptan",-0.238361389,2.3964025525,-0.8063707104,"https://salsa.debian.org/debian/python-kaptan","https://github.com/emre/kaptan.git",3814.6996064815,6,17,0,16,32,0,0,32,3,"3",1.73913043478261,2 +"python-libarchive-c",0.2084355293,1.8864921166,-0.3011849402,"https://salsa.debian.org/debian/python-libarchive-c","https://github.com/Changaco/python-libarchive-c.git",3365.1853587963,15,18,0,22,69,0,0,71,2,"2",1.54545454545455,1.97183098591549 +"libnacl",-0.5748525142,1.055075496,-0.9944771692,"https://salsa.debian.org/python-team/packages/python-libnacl","https://github.com/saltstack/libnacl.git",3360.8544791667,4,45,0,34,71,0,0,72,2,"2",1.91836734693878,1.98611111111111 +"python-libusb1",0.2265462586,3.5735295241,-0.6911313873,"https://salsa.debian.org/python-team/packages/python-libusb1","https://github.com/vpelletier/python-libusb1.git",5022.3082060185,13,14,0,21,84,0,0,85,4,"4",1.51851851851852,1.98823529411765 +"python-lz4",0.2828189113,1.8016304752,-0.1138420548,"https://salsa.debian.org/python-team/packages/python-lz4","https://github.com/python-lz4/python-lz4.git",3988.215625,8,43,0,37,148,0,0,158,3,"3",1.84313725490196,1.93670886075949 +"python-lzo",0.6457852422,3.6246917685,-0.1788164823,"https://salsa.debian.org/python-team/packages/python-lzo","https://github.com/jd-boyd/python-lzo",4282.0784259259,2,13,0,10,69,0,0,70,3,"3",1.86666666666667,1.98571428571429 +"python-mapnik",-0.22946102,0.3549703224,-0.441137685,"https://salsa.debian.org/debian-gis-team/python-mapnik","https://github.com/mapnik/python-mapnik.git",5494.8782638889,10,101,0,63,101,0,0,150,4,"4",1.90990990990991,1.67333333333333 +"MechanicalSoup",-0.5139427981,1.6546261984,-1.0099675897,"https://salsa.debian.org/python-team/packages/python-mechanicalsoup","https://github.com/hickford/MechanicalSoup",3488.7486574074,39,28,0,46,149,0,0,164,2,"2",1.41791044776119,1.90853658536585 +"mechanize",0.5587118446,1.5296801165,0.1098543172,"https://salsa.debian.org/python-team/packages/python-mechanize","https://github.com/python-mechanize/mechanize.git",5735.6054513889,5,12,0,14,81,0,0,548,4,"4",1.70588235294118,1.1478102189781 +"meld3",1.4808008162,4.1711738218,0.4100529738,"https://salsa.debian.org/python-team/packages/python-meld3","https://github.com/supervisor/meld3.git",4279.117650463,0,8,0,7,27,0,0,27,3,"3",2,2 +"PyMemoize",-1.6877152559,1.1203038488,-2.4079093642,"https://salsa.debian.org/debian/python-memoize","https://github.com/mikeboers/PyMemoize",4629.8626388889,2,6,0,5,18,0,0,19,3,"3",1.75,1.94736842105263 +"memprof",-1.0055408653,0.6195771117,-1.559509906,"https://salsa.debian.org/python-team/packages/python-memprof","https://github.com/jmdana/memprof",2110.1480324074,1,8,0,5,18,0,0,18,1,"1",1.88888888888889,2 +"MIDIUtil",-0.4550519333,2.0970578814,-0.9760105027,"https://salsa.debian.org/multimedia-team/python-midiutil","https://github.com/MarkCWirt/MIDIUtil.git",532.2564583333,2,4,0,2,47,0,0,47,1,"1",1.66666666666667,2 +"python-miio",-2.4535132218,0.0572909827,-2.9975615853,"https://salsa.debian.org/python-team/packages/miio","https://github.com/rytilahti/python-miio.git",2467.2539236111,163,5,0,156,136,0,0,270,1,"1",1.0297619047619,1.5037037037037 +"python-mimeparse",0.635087679,2.3635412747,-0.0635295991,"https://salsa.debian.org/python-team/modules/python-mimeparse","https://github.com/dbtsai/python-mimeparse.git",3368.8721296296,9,11,0,12,20,0,0,23,2,"2",1.55,1.8695652173913 +"motor",-1.6905579654,-0.1116236972,-2.117236641,"https://salsa.debian.org/python-team/packages/python-motor","https://github.com/mongodb/motor",3986.9431365741,28,30,0,47,2,0,0,47,3,"3",1.51724137931034,1.04255319148936 +"pymox",-0.4239911007,2.121473449,-1.1839102652,"https://salsa.debian.org/debian/python-mox","https://github.com/ivancrneto/pymox",3025.5165856482,3,7,0,5,8,0,0,10,2,"2",1.7,1.8 +"python-mpd2",-0.2990738247,0.3266786344,-0.4283928832,"https://salsa.debian.org/mpd-team/python-mpd","https://github.com/Mic92/python-mpd2",5765.5434143519,16,38,0,43,139,0,0,139,4,"4",1.7037037037037,2 +"mplexporter",-0.1464208389,2.3064325181,-0.9188944106,"https://salsa.debian.org/python-team/packages/python-mplexporter","https://github.com/mpld3/mplexporter",3220.5932523148,4,24,0,17,29,0,0,31,2,"2",1.85714285714286,1.93548387096774 +"pynacl",0.3194025143,1.5580852197,-0.0692227421,"https://salsa.debian.org/python-team/packages/python-nacl","https://github.com/pyca/pynacl",3948.360462963,44,26,1,61,44,0,0,91,3,"3",1.37142857142857,1.48351648351648 +"python-nameparser",-2.0123667482,0.1499038072,-2.4759914091,"https://salsa.debian.org/python-team/packages/python-nameparser","https://github.com/derek73/python-nameparser",4612.1091203704,9,18,1,23,121,0,0,123,3,"3",1.66666666666667,1.98373983739837 +"nest_asyncio",-3.3220087743,0.2652013224,-4.2429827404,"https://salsa.debian.org/python-team/packages/python-nest-asyncio","https://github.com/erdewit/nest_asyncio",1907.2440740741,4,10,0,12,92,0,0,92,1,"1",1.71428571428571,2 +"python-networkmanager",-0.3294740738,1.4731534732,-0.9543699399,"https://salsa.debian.org/python-team/packages/python-networkmanager","https://github.com/seveas/python-networkmanager",4090.3196759259,12,3,0,11,104,0,0,104,3,"3",1.2,2 +"oauthlib",0.3884344854,2.2364514825,-0.0809544139,"https://salsa.debian.org/python-team/packages/python-oauthlib","https://github.com/oauthlib/oauthlib",4357.2754050926,51,167,2,168,249,0,0,316,3,"3",1.76605504587156,1.7879746835443 +"odfpy",-0.1752613644,1.26653294,-0.4678571818,"https://salsa.debian.org/python-team/packages/python-odf","https://github.com/eea/odfpy",4744.619375,6,27,0,24,129,0,10,140,3,"3",1.81818181818182,1.92142857142857 +"python-pam",0.7194661619,3.5092607756,-0.0318286678,"https://salsa.debian.org/python-team/packages/python-pampy","https://github.com/FirefighterBlu3/python-pam",2926.9394907408,2,10,0,8,42,0,0,42,2,"2",1.83333333333333,2 +"pandocfilters",0.4325771732,2.9731648905,-0.1436774117,"https://salsa.debian.org/python-team/packages/python-pandocfilters","https://github.com/jgm/pandocfilters",2924.0615740741,12,31,0,34,69,0,0,74,2,"2",1.72093023255814,1.93243243243243 +"parameterized",-0.0852476016,1.7634629159,-0.4735189307,"https://salsa.debian.org/python-team/packages/python-parameterized","https://github.com/wolever/parameterized",4033.873125,6,29,0,26,199,0,0,201,3,"3",1.82857142857143,1.99004975124378 +"parse_type",-0.7766894785,2.2657323306,-1.6027471957,"https://salsa.debian.org/python-team/packages/python-parse-type","https://github.com/jenisys/parse_type",3544.3490162037,0,4,0,1,16,0,0,16,2,"2",2,2 +"periodictable",-1.0615188189,0.0399913751,-1.3403053026,"https://salsa.debian.org/science-team/python-periodictable","https://github.com/pkienzle/periodictable.git",5457.176412037,0,18,0,9,27,0,0,27,4,"4",2,2 +"pex",-0.7476267621,1.4651691422,-1.6685430991,"https://salsa.debian.org/python-team/packages/python-pex","https://github.com/pantsbuild/pex.git",3433.3294212963,95,47,0,104,155,0,0,220,2,"2",1.33098591549296,1.70454545454545 +"python-pgpdump",-0.1879378602,2.3259223777,-0.7707539804,"https://salsa.debian.org/python-team/packages/python-pgpdump","https://github.com/toofishes/python-pgpdump",826.806712963,5,2,0,5,24,0,0,24,1,"1",1.28571428571429,2 +"PGPy",-0.2430201905,2.4059068222,-1.197889114,"https://salsa.debian.org/debian/pgpy","https://github.com/SecurityInnovation/PGPy",3246.9911458333,11,33,2,35,91,0,1,103,2,"2",1.75,1.88349514563107 +"pgspecial",0.3830684523,3.0333672127,-0.3897890378,"https://salsa.debian.org/python-team/packages/python-pgspecial","https://github.com/dbcli/pgspecial",2959.9866319445,21,33,0,38,60,0,0,60,2,"2",1.61111111111111,2 +"phply",-0.0136994366,0.8386196269,-0.2146141125,"https://salsa.debian.org/debian/python-phply","https://github.com/viraptor/phply.git",4545.3284143519,2,13,0,9,35,0,0,37,3,"3",1.86666666666667,1.94594594594595 +"picklable-itertools",-1.9017855155,0.0686564891,-2.3399948958,"https://salsa.debian.org/python-team/packages/python-picklable-itertools","https://github.com/mila-iqia/picklable-itertools",176.1980324074,0,5,0,3,4,0,0,4,1,"1",2,2 +"pika",0.6194442951,2.792024793,-0.1295291186,"https://salsa.debian.org/python-team/packages/python-pika","https://github.com/pika/pika",5099.3438078704,52,181,1,165,190,0,0,319,4,"4",1.77682403433476,1.59561128526646 +"pyftpdlib",-0.1028969973,1.6271806139,-0.7069948318,"https://salsa.debian.org/python-team/packages/python-pyftpdlib","https://github.com/giampaolo/pyftpdlib",5695.2602314815,16,22,1,30,82,0,0,100,4,"4",1.57894736842105,1.82 +"pymeasure",-0.0345798255,2.662684469,-0.7066701418,"https://salsa.debian.org/science-team/python-pymeasure","https://github.com/ralph-group/pymeasure/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA +"pynvim",0.1793262124,2.0167259674,-0.2014913603,"https://salsa.debian.org/python-team/packages/python-pynvim","https://github.com/neovim/pynvim",3504.5291782407,26,35,0,55,243,0,0,250,2,"2",1.57377049180328,1.972 +"pyotp",-0.1936486463,2.043929727,-0.7744180298,"https://salsa.debian.org/python-team/packages/python-pyotp","https://github.com/pyauth/pyotp.git",4631.6125462963,26,20,0,33,124,0,0,130,3,"3",1.43478260869565,1.95384615384615 +"pyperclip",0.520944025,2.1523556396,-0.0782247035,"https://salsa.debian.org/sramacher/python-pyperclip","https://github.com/asweigart/pyperclip",3772.0925925926,7,31,0,31,330,0,0,330,3,"3",1.81578947368421,2 +"pyproj",-0.1814047386,0.2461708969,-0.2576178377,"https://salsa.debian.org/debian-gis-team/python-pyproj","https://github.com/pyproj4/pyproj.git",5681.2389236111,30,46,0,61,327,0,0,350,4,"4",1.60526315789474,1.93428571428571 +"pypubsub",-1.763743949,-0.068250645,-2.0677092705,"https://salsa.debian.org/python-team/packages/python-pypubsub","https://github.com/schollii/pypubsub",1788.0433680556,4,5,0,6,42,0,0,42,1,"1",1.55555555555556,2 +"pyramid_multiauth",-1.9341240314,0.3100051717,-2.4480383752,"https://github.com/douardda/pyramid_multiauth","https://github.com/douardda/pyramid_multiauth",1636.4991203704,0,10,0,6,0,0,0,6,1,"1",2,1 +"pysnmp",0.6296288884,1.9466089716,0.0848638325,"https://salsa.debian.org/python-team/packages/python-pysnmp4","https://github.com/etingof/pysnmp",4346.8111226852,17,11,0,21,393,0,0,394,3,"3",1.39285714285714,1.99746192893401 +"qtpy",0.3491974082,2.2294676618,-0.1435114165,"https://salsa.debian.org/python-team/packages/python-qtpy","https://github.com/spyder-ide/qtpy",3201.4270949074,20,62,3,59,61,0,1,101,2,"2",1.75609756097561,1.6039603960396 +"python-quantities",-0.0106025798,1.9580121766,-0.690445939,"https://salsa.debian.org/science-team/python-quantities","https://github.com/python-quantities/python-quantities.git",5020.6635069445,7,39,0,28,134,0,0,135,4,"4",1.84782608695652,1.99259259259259 +"PythonQwt",0.5933841457,3.6301488353,-0.4097779828,"https://salsa.debian.org/science-team/python-qwt","https://github.com/PierreRaybaut/PythonQwt.git",1193.9426967593,2,6,0,5,29,0,0,29,1,"1",1.75,2 +"rarfile",0.2024927767,3.0961464994,-0.5861303229,"https://salsa.debian.org/python-team/packages/python-rarfile","https://github.com/markokr/rarfile.git",5495.9042361111,8,13,0,16,102,0,0,103,4,"4",1.61904761904762,1.99029126213592 +"rdflib-jsonld",-0.0904254945,1.6642685449,-0.4956744476,"https://salsa.debian.org/python-team/packages/python-rdflib-jsonld","https://github.com/RDFLib/rdflib-jsonld",3605.0071180556,4,18,0,13,106,0,0,106,2,"2",1.81818181818182,2 +"readme_renderer",-0.1456681528,2.207631483,-0.5831215172,"https://salsa.debian.org/python-team/packages/python-readme-renderer","https://github.com/pypa/readme_renderer",3479.9030902778,12,22,0,30,133,0,0,141,2,"2",1.64705882352941,1.94326241134752 +"restless",-1.933361243,-0.9031369663,-2.2877460686,"https://salsa.debian.org/python-team/packages/python-restless","https://github.com/toastdriven/restless",2872.2400231482,8,30,0,30,106,0,0,106,2,"2",1.78947368421053,2 +"rply",-0.0320431964,1.7010393246,-0.4724323632,"https://salsa.debian.org/python-team/packages/python-rply","https://github.com/alex/rply",3096.8436689815,9,17,0,21,76,0,0,76,2,"2",1.65384615384615,2 +"python-rsa",0.3772367225,1.9634900436,-0.1098199505,"https://salsa.debian.org/python-team/packages/python-rsa","https://github.com/sybrenstuvel/python-rsa",5670.1946296296,33,16,2,36,126,0,0,139,4,"4",1.3265306122449,1.90647482014388 +"rtree",-0.1090383067,2.131754724,-0.531642492,"https://salsa.debian.org/debian-gis-team/python-rtree","https://github.com/Toblerity/rtree.git",5739.5775925926,25,24,0,39,225,0,1,231,4,"4",1.48979591836735,1.97402597402597 +"s3transfer",0.3673618005,2.5341337999,-0.1810184019,"https://salsa.debian.org/python-team/packages/python-s3transfer","https://github.com/boto/s3transfer",2891.8518634259,24,28,0,32,161,0,0,165,2,"2",1.53846153846154,1.97575757575758 +"sabyenc",0.4522797507,3.6365145505,-0.3981014069,"https://salsa.debian.org/python-team/packages/python-sabyenc","https://github.com/sabnzbd/sabyenc.git",2872.8934606482,9,4,0,8,28,0,0,28,2,"2",1.30769230769231,2 +"scandir",0.8273012672,3.7868324648,0.0056074744,"https://salsa.debian.org/python-team/packages/python-scandir","https://github.com/benhoyt/scandir",3760.0535185185,8,20,0,22,123,0,0,123,2,"2",1.71428571428571,2 +"scrapy-djangoitem",-1.8401324548,0.5412820006,-2.4359072724,"https://salsa.debian.org/python-team/packages/python-scrapy-djangoitem","https://github.com/scrapy-plugins/scrapy-djangoitem",2837.1132523148,0,13,0,10,26,0,0,32,2,"2",2,1.8125 +"scruffy",-0.8950842584,1.9677123819,-1.6884452058,"https://salsa.debian.org/python-team/packages/python-scruffy","https://github.com/snare/scruffy",1665.7056828704,2,5,0,4,9,0,1,10,1,"1",1.71428571428571,1.9 +"secretstorage",0.3387544545,2.1308358714,-0.0585012825,"https://salsa.debian.org/python-team/packages/python-secretstorage","https://github.com/mitya57/secretstorage",3916.1693055556,4,7,0,7,50,0,0,50,3,"3",1.63636363636364,2 +"serverfiles",-3.270914062,-0.0867153,-4.1789525946,"https://salsa.debian.org/python-team/packages/python-serverfiles","https://github.com/biolab/serverfiles",2007.9058333333,1,6,0,6,0,0,0,6,1,"1",1.85714285714286,1 +"setoptconf",-0.6718962402,1.1532142556,-1.127131302,"https://salsa.debian.org/python-team/packages/python-setoptconf","https://github.com/jayclassless/setoptconf.git",2788.0056365741,0,3,0,2,3,0,0,3,2,"2",2,2 +"py-setproctitle",1.0838445468,3.2588810317,0.2442150847,"https://salsa.debian.org/python-team/packages/python-setproctitle","https://github.com/dvarrazzo/py-setproctitle",5054.5442361111,9,10,0,12,86,0,0,89,4,"4",1.52631578947368,1.96629213483146 +"python-sfml",-0.3784249777,0.2624085655,-0.5818259297,"https://salsa.debian.org/games-team/python-sfml","https://github.com/intjelic/python-sfml",3326.0384143519,1,21,2,14,97,0,5,107,2,"2",1.95454545454545,1.90654205607477 +"sh",0.0684316621,2.7449205881,-0.5744266283,"https://salsa.debian.org/python-team/packages/python-sh","https://github.com/amoffat/sh",4327.6361689815,29,75,2,77,438,0,0,456,3,"3",1.72115384615385,1.96052631578947 +"python-slugify",-0.1216991783,1.414032002,-0.4325012299,"https://salsa.debian.org/python-team/packages/python-slugify","https://github.com/un33k/python-slugify",4027.6128240741,29,16,0,32,109,0,0,111,3,"3",1.35555555555556,1.98198198198198 +"socketIO-client",0.9390849724,4.9112952662,-0.4668774995,"https://salsa.debian.org/debian/python-socketio-client","https://github.com/invisibleroads/socketIO-client",1970.3003472222,0,39,2,22,294,0,0,294,1,"1",2,2 +"PySocks",1.0550621894,3.7043852987,0.1526077193,"https://salsa.debian.org/python-team/packages/python-socksipy","https://github.com/Anorov/PySocks",2386.177962963,3,31,0,28,172,0,0,173,1,"1",1.91176470588235,1.99421965317919 +"python-systemd",0.186853671,1.4520714492,-0.0787581662,"https://salsa.debian.org/systemd-team/python-systemd","https://github.com/systemd/python-systemd",3925.6328356482,47,10,0,47,124,0,0,134,3,"3",1.17543859649123,1.92537313432836 +"python-tabulate",0.4140804306,2.807860448,-0.2305820053,"https://salsa.debian.org/python-team/packages/python-tabulate","https://github.com/astanin/python-tabulate.git",3791.7183796296,22,72,0,74,329,0,0,365,3,"3",1.76595744680851,1.9013698630137 +"tasklib",0.0418096657,2.4101943872,-0.7381367832,"https://salsa.debian.org/tasktools-team/python-tasklib","https://github.com/GothenburgBitFactory/tasklib.git",3516.4481481482,7,15,0,12,63,0,0,64,2,"2",1.68181818181818,1.984375 +"tesserocr",-0.0713400087,2.5040315407,-0.9645789788,"https://salsa.debian.org/python-team/packages/python-tesserocr","https://github.com/sirfz/tesserocr.git",2852.5099537037,21,18,0,26,295,0,0,297,2,"2",1.46153846153846,1.99326599326599 +"testfixtures",-1.2559497362,1.6255436778,-1.9966424136,"https://salsa.debian.org/python-team/packages/python-testfixtures","https://github.com/Simplistix/testfixtures",5484.404849537,6,35,0,28,106,0,0,106,4,"4",1.85365853658537,2 +"python-textile",0.3424022956,1.7744319252,-0.1804144888,"https://salsa.debian.org/python-team/packages/python-textile","https://github.com/textile/python-textile.git",3971.2575578704,0,25,0,16,50,0,0,57,3,"3",2,1.87719298245614 +"translationstring",-0.284062414,1.4802740524,-0.7286152652,"https://salsa.debian.org/python-team/packages/python-translationstring","https://github.com/Pylons/translationstring.git",3733.753599537,2,15,0,14,26,0,0,27,2,"2",1.88235294117647,1.96296296296296 +"transliterate",-1.5052976672,1.0843261213,-2.1168561972,"https://salsa.debian.org/python-team/packages/python-transliterate","https://github.com/barseghyanartur/transliterate",3701.1602314815,5,13,0,12,48,0,1,49,2,"2",1.72222222222222,1.97959183673469 +"tzlocal",0.2105199468,2.3487549308,-0.2866926628,"https://salsa.debian.org/python-team/packages/python-tzlocal","https://github.com/regebro/tzlocal",4104.7635185185,12,22,0,27,150,0,0,150,3,"3",1.64705882352941,2 +"python-uinput",-0.4895299649,2.0822444703,-1.2154886237,"https://salsa.debian.org/python-team/packages/python-uinput","https://github.com/tuomasjjrasanen/python-uinput",2471.1649768519,3,17,0,9,71,0,0,76,1,"1",1.85,1.93421052631579 +"python-unicodecsv",0.2177173313,2.0742154186,-0.2503122986,"https://salsa.debian.org/python-team/packages/python-unicodecsv","https://github.com/jdunck/python-unicodecsv",1788.5991550926,0,17,0,12,93,0,0,93,1,"1",2,2 +"uritools",0.5665608671,3.6360712032,-0.2250089468,"https://salsa.debian.org/python-team/packages/python-uritools","https://github.com/tkem/uritools",3490.5498032407,0,3,1,3,16,0,0,16,2,"2",2,2 +"venusian",-0.2389886502,1.4708114679,-0.7217668025,"https://salsa.debian.org/python-team/packages/python-venusian","https://github.com/Pylons/venusian",5042.1797800926,6,25,0,24,62,0,0,62,4,"4",1.80645161290323,2 +"werkzeug",0.6469808555,1.6210316055,0.1636782742,"https://salsa.debian.org/python-team/packages/python-werkzeug","https://github.com/pallets/werkzeug",5778.3072453704,256,251,0,409,438,0,0,737,4,"4",1.49506903353057,1.59430122116689 +"WebSocket-for-Python",-0.3061877909,1.5232020738,-1.0477652346,"https://salsa.debian.org/python-team/packages/python-ws4py","https://github.com/Lawouach/WebSocket-for-Python.git",4476.5480902778,6,66,0,48,280,0,0,280,3,"3",1.91666666666667,2 +"xapian-haystack",-1.109004629,0.9965388597,-1.7612034563,"https://salsa.debian.org/python-team/packages/python-xapian-haystack","https://github.com/notanumber/xapian-haystack",5023.7127662037,14,13,1,15,127,0,4,133,4,"4",1.48148148148148,1.95488721804511 +"pytrainer",-0.1492986337,0.6667449272,-0.6246450089,"https://salsa.debian.org/python-team/packages/pytrainer","https://github.com/pytrainer/pytrainer.git",5724.7457175926,2,26,0,20,59,0,3,64,4,"4",1.92857142857143,1.921875 +"pytsk",-0.0170924765,1.3661578979,-0.4069676209,"https://salsa.debian.org/pkg-security-team/pytsk","https://github.com/py4n6/pytsk.git",4730.6620833333,5,8,0,6,36,0,2,38,3,"3",1.61538461538462,1.94736842105263 +"pyuca",-1.879124707,0.4546058772,-2.3447337433,"https://salsa.debian.org/python-team/packages/pyuca","https://github.com/jtauber/pyuca",2863.4539467593,0,6,0,5,24,0,1,26,2,"2",2,1.92307692307692 +"pyudev",0.3052041709,1.5797390647,-0.0988792966,"https://salsa.debian.org/python-team/packages/pyudev","https://github.com/pyudev/pyudev",4959.3462037037,7,18,0,18,85,0,1,90,3,"3",1.72,1.94444444444444 +"pyutilib",-0.2260212517,1.9708399125,-0.6584040073,"https://salsa.debian.org/python-team/packages/pyutilib","https://github.com/pyutilib/pyutilib",3833.6739467593,5,24,4,10,35,0,0,35,3,"3",1.82758620689655,2 +"pyvirtualdisplay",-0.7443150581,1.4769132038,-1.1764950176,"https://salsa.debian.org/python-team/packages/pyvirtualdisplay","https://github.com/ponty/pyvirtualdisplay.git",4649.3207175926,4,15,0,10,24,0,0,30,3,"3",1.78947368421053,1.8 +"PyWebDAV3",-0.4415298354,0.1562199484,-0.5984518002,"https://salsa.debian.org/tryton-team/pywebdav","https://github.com/andrewleech/PyWebDAV3.git",5191.6373958333,7,13,0,13,12,0,0,21,4,"4",1.65,1.57142857142857 +"pywinrm",1.3688605787,4.5307310299,0.2477962041,"https://salsa.debian.org/python-team/packages/python-winrm","https://github.com/diyan/pywinrm.git",3968.3538425926,2,35,0,22,257,0,0,259,3,"3",1.94594594594595,1.99227799227799 +"pywws",-2.0058814842,0.4297872508,-2.5845945208,"https://salsa.debian.org/debian-iot-team/pywws","https://github.com/jim-easterbrook/pywws",5328.5947916667,7,19,0,21,75,0,0,75,4,"4",1.73076923076923,2 +"pyx",-0.4214323147,0.0635788825,-0.526071945,"https://salsa.debian.org/debian/pyx3","https://github.com/pyx-project/pyx",5502.6121064815,6,10,0,9,36,0,0,36,4,"4",1.625,2 +"pyxid",-1.0618344074,1.7377650499,-1.9813829645,"https://salsa.debian.org/med-team/pyxid","https://github.com/cedrus-opensource/pyxid/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA +"pyxnat",0.8029079218,3.9217278842,-0.2730026627,"https://salsa.debian.org/med-team/pyxnat","https://github.com/pyxnat/pyxnat.git",4754.1324652778,6,37,0,24,63,0,0,65,3,"3",1.86046511627907,1.96923076923077 +"pyyaml",0.295656714,0.9675344795,0.0168556096,"https://salsa.debian.org/python-team/packages/pyyaml","https://github.com/yaml/pyyaml.git",5656.1894444445,35,19,0,38,575,0,2,583,4,"4",1.35185185185185,1.98627787307033 +"qstat",1.4847469863,3.5445875957,0.5684335793,"https://salsa.debian.org/debian/qstat","https://github.com/Unity-Technologies/qstat",4992.716099537,11,11,0,10,43,0,0,43,4,"4",1.5,2 +"QtPass",-0.2443828761,0.6069592093,-0.421666166,"https://salsa.debian.org/debian/qtpass","https://github.com/IJHack/QtPass",3407.0546643519,102,101,0,112,378,0,0,421,2,"2",1.49753694581281,1.8978622327791 +"qtractor",0.2052424785,1.081754113,-0.1776083366,"https://salsa.debian.org/multimedia-team/qtractor","https://github.com/rncbc/qtractor.git",5788.915474537,11,33,0,25,122,0,0,125,4,"4",1.75,1.976 +"qtspell",-1.1174264874,0.8182545984,-1.5529339,"https://salsa.debian.org/qt-kde-team/extras/qtspell","https://github.com/manisandro/qtspell.git",2705.0642476852,0,4,0,3,14,0,1,15,1,"1",2,1.93333333333333 +"quickroute-linux",-0.1342848887,2.9572779507,-1.1039128379,"https://github.com/ralovich/quickroute-linux.git","https://github.com/ralovich/quickroute-linux.git",5000.8862152778,1,8,0,2,9,0,0,9,4,"4",1.88888888888889,2 +"qxgedit",0.0309448749,2.6946289528,-0.6152383196,"https://salsa.debian.org/multimedia-team/qxgedit","https://github.com/rncbc/qxgedit.git",5219.9988078704,1,11,0,3,3,0,0,3,4,"4",1.91666666666667,2 +"qxmpp",-0.5119300912,1.2450413293,-0.9220194723,"https://salsa.debian.org/xmpp-team/qxmpp","https://github.com/qxmpp-project/qxmpp.git",5420.5084722222,31,20,0,35,124,0,4,138,4,"4",1.3921568627451,1.89855072463768 +"AnnotationDbi",0.0182386654,2.4812782442,-0.5700140917,"https://salsa.debian.org/r-pkg-team/r-bioc-annotationdbi","https://github.com/Bioconductor/AnnotationDbi.git",5746.8815509259,1,33,0,12,20,0,0,25,4,"4",1.97058823529412,1.8 +"BiocParallel",-0.3260931785,0.8473313885,-0.5919329079,"https://salsa.debian.org/r-pkg-team/r-bioc-biocparallel","https://github.com/Bioconductor/BiocParallel",3995.750625,8,26,0,20,99,0,2,102,3,"3",1.76470588235294,1.97058823529412 +"Biostrings",-0.3434817294,1.1478032448,-0.6149383263,"https://salsa.debian.org/r-pkg-team/r-bioc-biostrings","https://github.com/Bioconductor/Biostrings.git",5738.5090740741,8,24,0,13,81,0,0,84,4,"4",1.75,1.96428571428571 +"checkmate",0.0859378554,2.3942389138,-0.3501105734,"https://salsa.debian.org/r-pkg-team/r-cran-checkmate","https://github.com/mllg/checkmate.git",3631.5784722222,11,53,0,13,94,0,0,94,2,"2",1.828125,2 +"crosstalk",0.1167413716,2.2666840084,-0.3491412979,"https://salsa.debian.org/r-pkg-team/r-cran-crosstalk","https://github.com/rstudio/crosstalk.git",2973.0628472222,5,12,0,11,160,0,0,160,2,"2",1.70588235294118,2 +"crul",-0.379530865,2.0620312007,-0.8847066541,"https://salsa.debian.org/r-pkg-team/r-cran-crul","https://github.com/ropensci/crul.git",2488.6026967593,12,5,0,14,41,0,0,41,1,"1",1.29411764705882,2 +"eaf",-0.4302337125,1.8302163149,-0.875193303,"https://salsa.debian.org/r-pkg-team/r-cran-eaf","https://github.com/MLopez-Ibanez/eaf/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA +"filehash",0.2805937396,2.9173226699,-0.2488806021,"https://salsa.debian.org/r-pkg-team/r-cran-filehash","https://github.com/rdpeng/filehash/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA +"fs",0.5160636344,3.5162528692,-0.2653989308,"https://salsa.debian.org/r-pkg-team/r-cran-fs","https://github.com/r-lib/fs/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA +"gbm",0.3279916789,3.2242802977,-0.4462694205,"https://salsa.debian.org/r-pkg-team/r-cran-gbm","https://github.com/gbm-developers/gbm/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA +"ggeffects",-0.4101115748,1.6625213011,-0.8467537951,"https://salsa.debian.org/r-pkg-team/r-cran-ggeffects","https://github.com/strengejacke/ggeffects.git",2388.1511805556,6,17,0,11,238,0,0,240,1,"1",1.73913043478261,1.99166666666667 +"gnm",-0.0730492729,2.200175057,-0.5474121482,"https://salsa.debian.org/r-pkg-team/r-cran-gnm","https://github.com/hturner/gnm.git",5664.8181712963,2,3,0,4,13,0,0,14,4,"4",1.6,1.92857142857143 +"gtable",0.3604619903,2.5918478385,-0.180163877,"https://salsa.debian.org/r-pkg-team/r-cran-gtable","https://github.com/r-lib/gtable.git",4252.7226967593,3,15,0,11,32,0,0,32,3,"3",1.83333333333333,2 +"hms",0.2803130949,2.6915633826,-0.2371947898,"https://salsa.debian.org/r-pkg-team/r-cran-hms","https://github.com/tidyverse/hms",2747.6862152778,3,21,1,13,45,0,0,46,2,"2",1.875,1.97826086956522 +"htmlwidgets",0.2223804836,2.4523082161,-0.2245513837,"https://salsa.debian.org/r-pkg-team/r-cran-htmlwidgets","https://github.com/ramnathv/htmlwidgets.git",3428.7835185185,9,25,0,23,280,0,3,283,2,"2",1.73529411764706,1.98939929328622 +"httpuv",0.3875945435,2.2228957646,-0.1562790757,"https://salsa.debian.org/r-pkg-team/r-cran-httpuv","https://github.com/rstudio/httpuv.git",3956.9682986111,10,30,0,24,220,0,0,220,3,"3",1.75,2 +"lmerTestR",-0.2259054579,2.0342017389,-0.6812216469,"https://salsa.debian.org/r-pkg-team/r-cran-lmertest","https://github.com/runehaubo/lmerTestR.git",1009.6075115741,2,4,0,3,48,0,0,48,1,"1",1.66666666666667,2 +"memoise",0.1925230273,2.3898049253,-0.2410666252,"https://salsa.debian.org/r-pkg-team/r-cran-memoise","https://github.com/hadley/memoise.git",1189.1777777778,16,15,0,25,125,0,0,126,1,"1",1.48387096774194,1.99206349206349 +"openssl",0.1408311251,1.9736821031,-0.3054590509,"https://salsa.debian.org/r-pkg-team/r-cran-openssl","https://github.com/jeroen/openssl.git",3340.7487152778,9,9,0,11,104,0,0,105,2,"2",1.5,1.99047619047619 +"repr",-0.4200486236,1.3653979876,-0.7931488934,"https://salsa.debian.org/r-pkg-team/r-cran-repr","https://github.com/IRkernel/repr.git",3009.4312615741,13,11,0,19,107,0,5,113,2,"2",1.45833333333333,1.94690265486726 +"rhandsontable",-0.5116959513,1.6967263903,-0.9527875743,"https://salsa.debian.org/r-pkg-team/r-cran-rhandsontable","https://github.com/jrowen/rhandsontable.git",2472.1080902778,10,16,0,13,398,0,0,399,1,"1",1.61538461538462,1.99749373433584 +"stringr",0.0964776845,1.6534181355,-0.1881647637,"https://salsa.debian.org/r-pkg-team/r-cran-stringr","https://github.com/tidyverse/stringr/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA +"svglite",-0.1885587375,2.5890472118,-0.9181907319,"https://salsa.debian.org/r-pkg-team/r-cran-svglite","https://github.com/r-lib/svglite.git",4029.9752546296,5,22,0,17,93,0,0,94,3,"3",1.81481481481481,1.98936170212766 +"taxize",-0.5524366287,0.9514376137,-0.8175241604,"https://salsa.debian.org/r-pkg-team/r-cran-taxize","https://github.com/ropensci/taxize.git",4557.2839467593,10,50,0,33,204,0,0,205,3,"3",1.83333333333333,1.99512195121951 +"uwot",-2.1360077927,0.1637273439,-2.6156421022,"https://salsa.debian.org/r-pkg-team/r-cran-uwot","https://github.com/jlmelville/uwot.git",2010.5388078704,2,8,0,7,92,0,0,93,1,"1",1.8,1.98924731182796 +"webmockr",-0.4310376105,1.8277386609,-0.9299279762,"https://salsa.debian.org/r-pkg-team/r-cran-webmockr","https://github.com/ropensci/webmockr.git",3289.3273726852,4,4,0,5,17,0,0,18,2,"2",1.5,1.94444444444444 +"rabbitvcs",1.6714946058,3.5426783719,0.7068248862,"https://salsa.debian.org/python-team/packages/rabbitvcs","https://github.com/rabbitvcs/rabbitvcs.git",5506.5331481482,17,45,0,47,171,0,0,202,4,"4",1.7258064516129,1.84653465346535 +"radeontop",0.7905156023,3.9954216105,-0.1328982237,"https://salsa.debian.org/debian/radeontop","https://github.com/clbr/radeontop.git",3881.8500231482,5,20,0,19,110,0,0,114,3,"3",1.8,1.96491228070175 +"radio_beam",0.0745073319,3.00372116,-0.6555904149,"https://salsa.debian.org/debian-astro-team/radio-beam","https://github.com/radio-astro-tools/radio_beam",3526.8169791667,2,17,0,12,23,0,0,24,2,"2",1.89473684210526,1.95833333333333 +"radon",-1.263648812,0.2952439103,-1.5392083653,"https://salsa.debian.org/python-team/packages/radon","https://github.com/rubik/radon.git",4032.6238773148,45,20,0,51,208,0,0,208,3,"3",1.30769230769231,2 +"radsecproxy",-1.2258402548,0.3482737763,-1.8643939562,"https://salsa.debian.org/debian/radsecproxy","https://github.com/radsecproxy/radsecproxy.git",5771.4660069445,15,23,0,18,53,0,0,57,4,"4",1.60526315789474,1.92982456140351 +"nqp",0.9566218472,2.1033155845,0.3242094037,"https://salsa.debian.org/perl6-team/rakudo","https://github.com/Raku/nqp.git",5159.1587847222,24,165,0,111,165,0,3,181,4,"4",1.87301587301587,1.91160220994475 +"raspell",0.0344606053,2.1888191814,-0.7015258119,"https://salsa.debian.org/ruby-team/raspell","https://github.com/evan/raspell/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA +"rasterio",-0.1071898305,2.015565348,-0.6779665658,"https://salsa.debian.org/debian-gis-team/rasterio","https://github.com/rasterio/rasterio.git",3692.9866550926,96,61,0,141,10,0,13,158,2,"2",1.38853503184713,1.06329113924051 +"ratt",-0.4370630128,1.1211106019,-0.8710659773,"https://salsa.debian.org/go-team/packages/ratt","https://github.com/Debian/ratt",2545.9663194445,4,6,0,7,15,0,0,15,1,"1",1.6,2 +"openrdate",0.4382808092,1.3203416533,0.0177798963,"https://salsa.debian.org/debian/rdate","https://github.com/resurrecting-open-source-projects/openrdate",876.4736111111,0,4,0,3,6,0,0,6,1,"1",2,2 +"rdiff-backup",1.0568039762,1.5664048612,0.6904043618,"https://salsa.debian.org/python-team/applications/rdiff-backup","https://github.com/rdiff-backup/rdiff-backup.git",5728.7282407408,45,27,0,46,61,0,0,90,4,"4",1.375,1.67777777777778 +"redis-py-cluster",-1.8001809263,0.773142511,-2.5308098382,"https://salsa.debian.org/python-team/packages/redis-py-cluster","https://github.com/Grokzen/redis-py-cluster",3217.2146527778,55,25,3,58,325,0,0,330,2,"2",1.3125,1.98484848484848 +"r.js",0.307781271,1.8450766211,-0.1061121379,"https://salsa.debian.org/js-team/requirejs","https://github.com/requirejs/r.js.git",4511.8290740741,2,70,0,53,645,0,3,658,3,"3",1.97222222222222,1.98024316109422 +"ripe.atlas.sagan",-0.8350788458,1.3446746037,-1.3262997043,"https://salsa.debian.org/python-team/packages/ripe-atlas-sagan","https://github.com/RIPE-NCC/ripe.atlas.sagan",2585.8181481482,2,22,0,13,17,0,0,19,1,"1",1.91666666666667,1.89473684210526 +"rlwrap",-0.017815457,0.2341200643,-0.1189260094,"https://salsa.debian.org/debian/rlwrap","https://github.com/hanslub42/rlwrap",3317.1894560185,6,18,2,18,111,0,2,113,2,"2",1.75,1.98230088495575 +"rope",1.5978468361,3.9671998177,0.5551935604,"https://salsa.debian.org/python-team/packages/rope","https://github.com/python-rope/rope",5713.8836458333,27,64,1,64,166,0,6,193,4,"4",1.7032967032967,1.860103626943 +"bond_core",-0.4557919444,0.8030863044,-0.7461613445,"https://salsa.debian.org/science-team/ros-bond-core","https://github.com/ros/bond_core",5161.8582291667,13,47,0,19,71,0,0,72,4,"4",1.78333333333333,1.98611111111111 +"genmsg",-0.0171725935,2.3757962259,-0.5825726576,"https://salsa.debian.org/science-team/ros-genmsg","https://github.com/ros/genmsg",4008.1554976852,10,28,1,20,69,0,0,71,3,"3",1.73684210526316,1.97183098591549 +"genpy",-0.6136991201,-0.6108271088,-0.6141657046,"https://salsa.debian.org/science-team/ros-genpy","https://github.com/ros/genpy.git",4178.1003472222,21,31,0,33,89,0,0,91,3,"3",1.59615384615385,1.97802197802198 +"geometry",-0.5506557748,0.4058218051,-0.730025317,"https://salsa.debian.org/science-team/ros-geometry","https://github.com/ros/geometry",5094.8150694445,26,84,1,57,212,0,0,217,4,"4",1.76363636363636,1.97695852534562 +"image_common",-0.4587743218,0.0450984941,-0.6096991982,"https://salsa.debian.org/science-team/ros-image-common","https://github.com/ros-perception/image_common.git",5179.6323611111,38,47,0,28,228,0,2,230,4,"4",1.55294117647059,1.99130434782609 +"interactive_markers",-0.2522280854,2.1257586459,-0.8003900423,"https://salsa.debian.org/science-team/ros-interactive-markers","https://github.com/ros-visualization/interactive_markers.git",5635.5972685185,21,62,0,25,70,0,0,72,4,"4",1.74698795180723,1.97222222222222 +"kdl_parser",-0.3386572847,2.2780300935,-0.9138488719,"https://salsa.debian.org/science-team/ros-kdl-parser","https://github.com/ros/kdl_parser",4840.7517013889,32,70,0,45,47,0,0,80,3,"3",1.68627450980392,1.5875 +"laser_geometry",-0.418947578,0.783831601,-0.6760367366,"https://salsa.debian.org/science-team/ros-laser-geometry","https://github.com/ros-perception/laser_geometry",5200.3426388889,9,44,0,21,63,0,0,65,4,"4",1.83018867924528,1.96923076923077 +"message_runtime",-0.2905975286,1.6300481977,-0.6771923217,"https://salsa.debian.org/science-team/ros-message-runtime","https://github.com/ros/message_runtime.git",2931.9169212963,1,6,0,3,1,0,0,3,2,"2",1.85714285714286,1.33333333333333 +"navigation_msgs",-0.585376458,1.338109234,-0.9801897126,"https://salsa.debian.org/science-team/ros-navigation-msgs","https://github.com/ros-planning/navigation_msgs",4055.7909027778,6,14,0,6,18,0,0,20,3,"3",1.7,1.9 +"nodelet_core",-0.0806493057,2.3062700037,-0.6511678143,"https://salsa.debian.org/science-team/ros-nodelet-core","https://github.com/ros/nodelet_core",4750.0362731482,13,47,1,29,90,0,0,92,3,"3",1.78333333333333,1.97826086956522 +"pluginlib",-0.6634443823,0.7184010327,-0.9470101264,"https://salsa.debian.org/science-team/ros-pluginlib","https://github.com/ros/pluginlib.git",5189.6688194445,29,44,0,22,130,0,0,131,4,"4",1.6027397260274,1.99236641221374 +"vision_opencv",-0.5521042677,0.5682460886,-0.8284518786,"https://salsa.debian.org/science-team/ros-vision-opencv","https://github.com/ros-perception/vision_opencv",5223.1408680556,33,82,0,61,435,0,0,437,4,"4",1.71304347826087,1.9954233409611 +"rss2email",0.3314855505,0.7157681983,0.0455417284,"https://salsa.debian.org/python-team/packages/rss2email","https://github.com/rss2email/rss2email.git",3888.6072916667,25,44,0,51,130,0,0,145,3,"3",1.63768115942029,1.89655172413793 +"actionpack-xml_parser",-0.2996184364,1.3428057072,-0.5955184752,"https://salsa.debian.org/ruby-team/ruby-actionpack-xml-parser","https://github.com/rails/actionpack-xml_parser",1540.6708333333,2,13,0,9,34,0,0,34,1,"1",1.86666666666667,2 +"active_model_serializers",-2.6276778243,-0.1926975438,-3.2592310267,"https://salsa.debian.org/ruby-team/ruby-active-model-serializers","https://github.com/rails-api/active_model_serializers/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA +"activeldap",-1.4156697614,-0.4511022965,-1.5988774793,"https://salsa.debian.org/ruby-team/ruby-activeldap","https://github.com/activeldap/activeldap/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA +"activerecord-import",-1.9687719488,1.0512667089,-2.7168041881,"https://salsa.debian.org/ruby-team/ruby-activerecord-import","https://github.com/zdennis/activerecord-import/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA +"nulldb",-2.9231293508,0.23307279,-3.9919104886,"https://salsa.debian.org/ruby-team/ruby-activerecord-nulldb-adapter","https://github.com/nulldb/nulldb/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA +"acts_as_list",-1.8199662912,-1.4681851633,-1.8707866646,"https://salsa.debian.org/ruby-team/ruby-acts-as-list","https://github.com/swanandp/acts_as_list",4913.7026157407,58,72,1,107,411,0,3,423,3,"3",1.55384615384615,1.97163120567376 +"addressable",0.4108416878,2.8755637332,-0.1685908494,"https://salsa.debian.org/ruby-team/ruby-addressable","https://github.com/sporkmonger/addressable/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA +"ahoy_email",-4.4435950424,-0.9410641928,-5.3641400248,"https://salsa.debian.org/ruby-team/ruby-ahoy-email","https://github.com/ankane/ahoy_email/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA +"amqp",-1.8149935347,0.3288060449,-2.3239990954,"https://salsa.debian.org/ruby-team/ruby-amqp","https://github.com/ruby-amqp/amqp.git",4994.8880787037,18,59,0,41,137,0,0,146,4,"4",1.76623376623377,1.93835616438356 +"api-pagination",-3.3044182875,-0.0567093294,-4.1951110602,"https://salsa.debian.org/ruby-team/ruby-api-pagination","https://github.com/davidcelis/api-pagination.git",3040.7300578704,2,39,0,31,10,0,0,37,2,"2",1.95121951219512,1.27027027027027 +"arbre",-4.8029050341,-2.1273433872,-5.4412019806,"https://salsa.debian.org/ruby-team/ruby-arbre","https://github.com/activeadmin/arbre/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA +"autoprefixer-rails",-0.2315449554,2.8349504609,-1.0454191857,"https://salsa.debian.org/ruby-team/ruby-autoprefixer-rails","https://github.com/ai/autoprefixer-rails/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA +"awesome_print",-0.1589005828,2.0284975516,-0.8426752553,"https://salsa.debian.org/ruby-team/ruby-awesome-print","https://github.com/awesome-print/awesome_print/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA +"backports",0.1539156176,2.1183447847,-0.4562399385,"https://salsa.debian.org/ruby-team/ruby-backports","https://github.com/marcandre/backports/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA +"beaneater",-1.3606359648,1.1630055771,-2.0175948675,"https://salsa.debian.org/ruby-team/ruby-beaneater","https://github.com/beanstalkd/beaneater",3900.0326736111,5,29,1,26,71,0,2,73,3,"3",1.85294117647059,1.97260273972603 +"browser",-0.1660846663,3.3869132145,-1.1464271076,"https://salsa.debian.org/ruby-team/ruby-browser","https://github.com/fnando/browser.git",4214.4159027778,56,56,0,92,148,0,0,210,3,"3",1.5,1.7047619047619 +"clockwork",-1.6175893707,0.2897910827,-2.1048468681,"https://salsa.debian.org/ruby-team/ruby-clockwork","https://github.com/Rykian/clockwork",4663.0759143519,22,47,0,52,93,0,0,126,3,"3",1.68115942028985,1.73809523809524 +"coffee-rails",0.3091824065,2.8142114504,-0.2736133929,"https://salsa.debian.org/ruby-team/ruby-coffee-rails","https://github.com/rails/coffee-rails",3619.3450231482,7,34,0,31,141,0,0,142,2,"2",1.82926829268293,1.99295774647887 +"concurrent-ruby",0.5566030605,2.9441693658,-0.0717542554,"https://salsa.debian.org/ruby-team/ruby-concurrent","https://github.com/ruby-concurrency/concurrent-ruby.git",3789.0811458333,43,132,0,147,281,0,0,329,3,"3",1.75428571428571,1.85410334346505 +"crack",-0.2561449098,2.087316532,-0.8772440851,"https://salsa.debian.org/ruby-team/ruby-crack","https://github.com/jnunemaker/crack",4290.8581481482,10,28,0,32,97,0,0,104,3,"3",1.73684210526316,1.93269230769231 +"cri",-0.2343045243,2.3306711919,-0.7929491714,"https://salsa.debian.org/ruby-team/ruby-cri","https://github.com/ddfreyne/cri",5399.7816666667,2,13,0,10,43,0,0,43,4,"4",1.86666666666667,2 +"curses",0.2397321091,3.7638726076,-0.6627285256,"https://salsa.debian.org/ruby-team/ruby-curses","https://github.com/ruby/curses.git",5368.611724537,1,10,0,23,71,0,0,72,4,"4",1.90909090909091,1.98611111111111 +"dbf",-2.1729354458,-1.1249256758,-2.3569268761,"https://salsa.debian.org/ruby-team/ruby-dbf","https://github.com/infused/dbf/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA +"ruby-dbus",-0.5967981722,1.7453526545,-1.2803486489,"https://salsa.debian.org/ruby-team/ruby-dbus","https://github.com/mvidner/ruby-dbus",4746.8070601852,9,33,0,28,89,0,0,93,3,"3",1.78571428571429,1.95698924731183 +"default_value_for",-0.8448203677,1.505826156,-1.3079220043,"https://salsa.debian.org/ruby-team/ruby-default-value-for","https://github.com/FooBarWidget/default_value_for/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA +"delayed_job",-0.2286424071,2.470279089,-0.9617467357,"https://salsa.debian.org/ruby-team/ruby-delayed-job","http://github.com/collectiveidea/delayed_job/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA +"devise-two-factor",-0.6624262185,1.6467126273,-1.2753154222,"https://salsa.debian.org/ruby-team/ruby-devise-two-factor","https://github.com/tinfoil/devise-two-factor.git",3466.0953935185,20,37,0,43,252,0,0,258,2,"2",1.64912280701754,1.97674418604651 +"diaspora_federation",-4.7376054498,-2.2734066052,-5.4037842301,"https://salsa.debian.org/ruby-team/ruby-diaspora-federation","https://github.com/diaspora/diaspora_federation/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA +"diff-lcs",0.3071796152,2.5635803467,-0.2628240016,"https://salsa.debian.org/ruby-team/ruby-diff-lcs","https://github.com/halostatue/diff-lcs/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA +"diffy",-0.2255220294,2.8131844872,-1.0283299527,"https://salsa.debian.org/ruby-team/ruby-diffy","https://github.com/samg/diffy",4494.6685763889,5,31,0,28,132,0,0,132,3,"3",1.86111111111111,2 +"distribution",-2.1011793074,0.9112617849,-3.0579162724,"https://salsa.debian.org/ruby-team/ruby-distribution","https://github.com/sciruby/distribution/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA +"docker-api",0.2906321596,4.2039401292,-1.0121523475,"https://salsa.debian.org/ruby-team/ruby-docker-api","https://github.com/swipely/docker-api",3249.0699421296,17,99,0,86,233,0,0,256,2,"2",1.85344827586207,1.91015625 +"ruby-domain_name",0.2651495015,2.3454735809,-0.1388653919,"https://salsa.debian.org/ruby-team/ruby-domain-name","https://github.com/knu/ruby-domain_name/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA +"em-synchrony",-2.0598738156,0.4564215093,-2.9786603575,"https://salsa.debian.org/ruby-team/ruby-em-synchrony","https://github.com/igrigorik/em-synchrony",2910.8221180556,2,57,0,41,186,0,1,190,2,"2",1.96610169491525,1.97894736842105 +"factory_girl",-1.4263061364,0.5433633199,-1.9953583847,"https://salsa.debian.org/ruby-team/ruby-factory-girl","https://github.com/thoughtbot/factory_girl.git",4913.9169675926,224,76,0,233,139,0,74,424,3,"3",1.25333333333333,1.32783018867925 +"fakeredis",-3.9027611166,-1.9110018697,-4.3340476978,"https://salsa.debian.org/ruby-team/ruby-fakeredis","https://github.com/guilleiguaran/fakeredis.git",3981.188900463,20,88,0,77,219,0,0,219,3,"3",1.81481481481481,2 +"fakeweb",-2.1455045277,-0.7731874586,-2.5667966225,"https://salsa.debian.org/ruby-team/ruby-fakeweb","https://github.com/chrisk/fakeweb.git",3218.6643865741,6,19,0,19,136,0,0,145,2,"2",1.76,1.93793103448276 +"faraday_middleware",-0.2690476788,2.0619472224,-0.7696905372,"https://salsa.debian.org/ruby-team/ruby-faraday-middleware","https://github.com/lostisland/faraday_middleware",4563.5818981482,47,29,1,58,244,0,14,260,3,"3",1.38157894736842,1.93846153846154 +"fast_gettext",-0.1209401725,1.2360688234,-0.5688307825,"https://salsa.debian.org/ruby-team/ruby-fast-gettext","https://github.com/grosser/fast_gettext",5110.3340046296,3,48,0,29,84,0,4,90,4,"4",1.94117647058824,1.93333333333333 +"fastimage",-0.9259690851,1.7219406128,-1.4847810256,"https://salsa.debian.org/ruby-team/ruby-fastimage","https://github.com/sdsykes/fastimage",5223.7173726852,7,44,0,46,117,0,0,125,4,"4",1.86274509803922,1.936 +"fog-rackspace",-0.4991371264,1.9082417738,-1.1448163084,"https://salsa.debian.org/ruby-team/ruby-fog-rackspace","https://github.com/fog/fog-rackspace",1479.8924537037,3,5,0,4,40,0,0,40,1,"1",1.625,2 +"ruby-fogbugz",-0.712082495,1.9230578337,-1.2759846712,"https://salsa.debian.org/ruby-team/ruby-fogbugz","https://github.com/firmafon/ruby-fogbugz",2091.2249884259,2,11,0,9,16,0,0,16,1,"1",1.84615384615385,2 +"font-awesome-rails",-0.8180755531,0.4347325375,-1.0809960447,"https://salsa.debian.org/ruby-team/ruby-font-awesome-rails","https://github.com/bokmann/font-awesome-rails",4227.7840856482,7,30,0,28,346,0,2,349,3,"3",1.81081081081081,1.99140401146132 +"foreman",-0.8272618131,1.5097537204,-1.3755635236,"https://salsa.debian.org/ruby-team/ruby-foreman","http://github.com/ddollar/foreman/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA +"fssm",-0.4348169171,2.3642288128,-1.1313798455,"https://salsa.debian.org/ruby-team/ruby-fssm","https://github.com/ttilley/fssm.git",2641.9220023148,2,11,0,9,53,0,0,54,1,"1",1.84615384615385,1.98148148148148 +"gelf-rb",-2.0473403812,0.3850902599,-2.7168981677,"https://salsa.debian.org/ruby-team/ruby-gelf","https://github.com/Graylog2/gelf-rb",4546.1701157407,9,25,0,21,141,0,0,142,3,"3",1.73529411764706,1.99295774647887 +"gettext_i18n_rails",-0.7613069529,2.0256293486,-1.5091771924,"https://salsa.debian.org/ruby-team/ruby-gettext-i18n-rails","https://github.com/grosser/gettext_i18n_rails",5235.7802546296,11,59,0,51,141,0,0,144,4,"4",1.84285714285714,1.97916666666667 +"gettext_i18n_rails_js",-0.9612583287,2.4872560383,-1.8785203213,"https://salsa.debian.org/ruby-team/ruby-gettext-i18n-rails-js","https://github.com/webhippie/gettext_i18n_rails_js",4076.9871759259,2,24,0,18,7,0,0,22,3,"3",1.92307692307692,1.31818181818182 +"gettext-setup-gem",-0.5280470276,1.250073738,-0.9596386922,"https://salsa.debian.org/puppet-team/ruby-gettext-setup","https://github.com/puppetlabs/gettext-setup-gem",2424.9263310185,17,20,0,23,43,0,0,44,1,"1",1.54054054054054,1.97727272727273 +"ruby-gir-ffi",-1.5231800876,0.4754387315,-2.1310553218,"https://salsa.debian.org/ruby-team/ruby-gir-ffi","https://github.com/mvz/ruby-gir-ffi",5437.5734375,3,7,0,7,35,0,4,39,4,"4",1.7,1.8974358974359 +"ruby-git",-0.6108616509,1.212287958,-1.0441459189,"https://salsa.debian.org/ruby-team/ruby-git","https://github.com/ruby-git/ruby-git/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA +"ruby-team",-2.3136488279,0.3256391086,-2.9739498003,"https://salsa.debian.org/ruby-team/ruby-github-api","https://salsa.debian.org/ruby-team/ruby-github-api",2392.4012268519,0,6,0,0,0,0,0,0,1,"1",2,NA +"ruby-team",-0.649517699,1.7591556518,-1.1632479129,"https://salsa.debian.org/ruby-team/ruby-github-linguist","https://salsa.debian.org/ruby-team/ruby-github-linguist",3497.9967939815,0,11,0,0,0,0,0,0,2,"2",2,NA +"ruby-team",-1.105143203,0.5312271054,-1.4552026927,"https://salsa.debian.org/ruby-team/ruby-github-markdown","https://salsa.debian.org/ruby-team/ruby-github-markdown",3170.9246875,0,7,0,0,0,0,0,0,2,"2",2,NA +"ruby-team",-0.0402315958,2.2658512207,-0.751462188,"https://salsa.debian.org/ruby-team/ruby-github-markup","https://salsa.debian.org/ruby-team/ruby-github-markup",3514.5048263889,0,15,0,0,0,0,0,0,2,"2",2,NA +"globalid",0.5667944257,3.0518520834,-0.164807865,"https://salsa.debian.org/ruby-team/ruby-globalid","https://github.com/rails/globalid/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA +"guard",-2.9807132483,-1.6178467609,-3.3128126957,"https://salsa.debian.org/ruby-team/ruby-guard","https://github.com/guard/guard.git",4726.434537037,21,191,0,150,537,0,199,776,3,"3",1.90094339622642,1.69201030927835 +"hipchat-rb",-0.6566424992,1.6469892033,-1.2629040655,"https://salsa.debian.org/ruby-team/ruby-hipchat","https://github.com/hipchat/hipchat-rb",2705.747349537,7,102,0,82,222,0,1,227,1,"1",1.93577981651376,1.97797356828194 +"hiredis-rb",-0.8641250548,1.2597163597,-1.3598436427,"https://salsa.debian.org/ruby-team/ruby-hiredis","https://github.com/redis/hiredis-rb.git",4451.3495601852,10,19,0,20,124,0,1,127,3,"3",1.6551724137931,1.97637795275591 +"http.rb",0.5328919596,3.1587146036,-0.5041412503,"https://salsa.debian.org/ruby-team/ruby-http","https://github.com/httprb/http.rb",4428.9060416667,68,68,2,106,42,0,37,169,3,"3",1.5,1.24852071005917 +"jquery-rails",0.4762916242,2.5289403929,-0.1671409996,"https://salsa.debian.org/ruby-team/ruby-jquery-rails","https://github.com/rails/jquery-rails.git",4697.0958680556,14,69,0,65,417,0,1,425,3,"3",1.83132530120482,1.98117647058824 +"jquery-ui-rails",-0.5553100399,1.254748517,-1.1496297544,"https://salsa.debian.org/ruby-team/ruby-jquery-ui-rails","https://github.com/joliss/jquery-ui-rails",4080.9697453704,4,20,0,18,217,0,0,217,3,"3",1.83333333333333,2 +"js-routes",-3.4644388809,-0.4489124279,-4.2577079397,"https://salsa.debian.org/ruby-team/ruby-js-routes","https://github.com/railsware/js-routes",3471.607662037,19,61,0,62,240,0,0,242,2,"2",1.7625,1.99173553719008 +"json-jwt",-0.6646781739,1.8243330124,-1.3376720774,"https://salsa.debian.org/ruby-team/ruby-json-jwt","https://github.com/nov/json-jwt/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA +"json-schema",-2.1030941989,-0.2528356332,-2.4758055487,"https://salsa.debian.org/ruby-team/ruby-json-schema","https://github.com/voxpupuli/json-schema/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA +"json_spec",-2.5962462222,0.2357466454,-3.2697648762,"https://salsa.debian.org/ruby-team/ruby-json-spec","https://github.com/collectiveidea/json_spec",2153.749525463,1,19,0,16,121,0,0,122,1,"1",1.95,1.99180327868852 +"ruby-jwt",-0.0089310607,2.9299158213,-0.7358933013,"https://salsa.debian.org/ruby-team/ruby-jwt","https://github.com/jwt/ruby-jwt/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA +"kakasi_ffi",-3.4351277044,-0.6639963768,-4.2188884559,"https://salsa.debian.org/ruby-team/ruby-kakasi-ffi","https://github.com/knu/kakasi_ffi/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA +"kaminari",-0.5485185975,1.0463989901,-0.9640266374,"https://salsa.debian.org/ruby-team/ruby-kaminari","https://github.com/kaminari/kaminari",4634.2992476852,35,152,3,153,70,0,47,257,3,"3",1.81283422459893,1.27237354085603 +"kitchen-salt",-5.0389266876,-2.9100359531,-5.4788025236,"https://salsa.debian.org/ruby-team/ruby-kitchen-salt","https://github.com/saltstack/kitchen-salt/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA +"kramdown",0.1585424898,1.288591817,-0.1774821194,"https://salsa.debian.org/ruby-team/ruby-kramdown","https://github.com/gettalong/kramdown/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA +"ruby-ldap",0.9723697162,3.8411235557,-0.1487304827,"https://salsa.debian.org/ruby-team/ruby-ldap","https://github.com/bearded/ruby-ldap",3395.5528703704,4,15,0,10,49,0,2,51,2,"2",1.78947368421053,1.96078431372549 +"libxml-ruby",-0.1652439642,1.5527354518,-0.7540442503,"https://salsa.debian.org/ruby-team/ruby-libxml","https://github.com/xml4r/libxml-ruby/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA +"mechanize",-0.3858941786,1.2331276206,-0.8805502233,"https://salsa.debian.org/ruby-team/ruby-mechanize","https://github.com/sparklemotion/mechanize.git",5735.6054513889,5,12,0,103,529,0,6,548,4,"4",1.70588235294118,1.96532846715328 +"moneta",-0.5640132497,0.2515905482,-0.8103956074,"https://salsa.debian.org/ruby-team/ruby-moneta","https://github.com/moneta-rb/moneta",5182.1595023148,20,32,0,38,98,45,0,155,4,"4",1.61538461538462,1.63225806451613 +"msgpack-ruby",0.2893496157,2.7505742261,-0.3169362878,"https://salsa.debian.org/ruby-team/ruby-msgpack","https://github.com/msgpack/msgpack-ruby",4471.1247453704,7,115,0,71,168,0,0,198,3,"3",1.94262295081967,1.84848484848485 +"multi_json",0.6582999616,3.1811345182,-0.0546345167,"https://salsa.debian.org/ruby-team/ruby-multi-json","https://github.com/intridea/multi_json",3679.9527430556,10,44,1,48,209,0,1,218,2,"2",1.81481481481481,1.95871559633028 +"ruby-team",-0.6432733622,1.9225985539,-1.2230466394,"https://salsa.debian.org/ruby-team/ruby-omniauth-github","https://salsa.debian.org/ruby-team/ruby-omniauth-github",3158.4246296296,0,8,0,0,0,0,0,0,2,"2",2,NA +"omniauth-gitlab",-0.8634553119,1.3390999825,-1.29446321,"https://salsa.debian.org/ruby-team/ruby-omniauth-gitlab","https://github.com/linchus/omniauth-gitlab/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA +"omniauth-openid",-2.3993574129,-0.1716426742,-2.9778348021,"https://salsa.debian.org/ruby-team/ruby-omniauth-openid","https://github.com/intridea/omniauth-openid",4671.7113888889,3,19,0,14,49,0,0,57,3,"3",1.86363636363636,1.85964912280702 +"omniauth-saml",-0.5579531725,2.353187853,-1.2497308047,"https://salsa.debian.org/ruby-team/ruby-omniauth-saml","https://github.com/PracticallyGreen/omniauth-saml.git",4118.1158217593,12,46,0,40,204,0,0,207,3,"3",1.79310344827586,1.98550724637681 +"open4",0.0907349731,2.6591042616,-0.4921712465,"https://salsa.debian.org/ruby-team/ruby-open4","https://github.com/ahoward/open4",1740.4206597222,2,8,0,7,38,0,0,40,1,"1",1.8,1.95 +"openid_connect",-1.1502490607,2.0041817142,-2.12720173,"https://salsa.debian.org/ruby-team/ruby-openid-connect","https://github.com/nov/openid_connect",4182.9791435185,0,17,0,9,93,0,3,96,3,"3",2,1.96875 +"packable",-3.0992250392,-0.7077744526,-3.6975414863,"https://salsa.debian.org/ruby-team/ruby-packable","https://github.com/marcandre/packable/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA +"paint",0.0340746752,1.782920882,-0.2850565902,"https://salsa.debian.org/ruby-team/ruby-paint","https://github.com/janlelis/paint.git",4285.910474537,4,14,0,14,30,0,0,31,3,"3",1.77777777777778,1.96774193548387 +"parallel",0.6193238415,3.5398365982,-0.3774990833,"https://salsa.debian.org/ruby-team/ruby-parallel","https://github.com/grosser/parallel/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA +"paranoia",-0.1012866416,3.7176288674,-1.2611069956,"https://salsa.debian.org/ruby-team/ruby-paranoia","https://github.com/rubysherpas/paranoia/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA +"ruby_parser",-0.2008414789,1.500579567,-0.6200732147,"https://salsa.debian.org/ruby-team/ruby-parser","https://github.com/seattlerb/ruby_parser.git",5671.9061921296,0,3,0,2,215,0,0,216,4,"4",2,1.99537037037037 +"pathname2",-0.9624861378,1.7646456748,-1.5703348288,"https://salsa.debian.org/ruby-team/ruby-pathname2","https://github.com/djberg96/pathname2",4825.4280902778,0,6,0,1,5,0,1,6,3,"3",2,1.83333333333333 +"pdf-reader",0.5615735066,2.9676531602,-0.1143510479,"https://salsa.debian.org/ruby-team/ruby-pdf-reader","https://github.com/yob/pdf-reader",5741.4093981482,14,55,0,50,0,0,0,50,4,"4",1.79710144927536,1 +"posix-spawn",0.1309262243,1.6920070582,-0.2475689059,"https://salsa.debian.org/ruby-team/ruby-posix-spawn","https://github.com/rtomayko/posix-spawn",3425.5233101852,3,31,0,26,114,0,0,116,2,"2",1.91176470588235,1.98275862068966 +"rack",0.5237066371,1.7902869998,0.0263794792,"https://salsa.debian.org/ruby-team/ruby-rack","https://github.com/rack/rack",5772.4169444445,210,362,9,391,706,0,76,1026,4,"4",1.63286713286713,1.68810916179337 +"rack-cors",-0.412726661,2.4616028734,-1.1580055428,"https://salsa.debian.org/ruby-team/ruby-rack-cors","https://github.com/cyu/rack-cors",4892.2220601852,37,39,0,61,338,0,0,361,3,"3",1.51315789473684,1.93628808864266 +"punycode.js",0.5843909394,4.0464162194,-0.4662308176,"https://salsa.debian.org/ruby-team/ruby-rails-assets-punycode","https://github.com/bestiejs/punycode.js",4371.2037384259,18,3,0,19,151,0,0,151,3,"3",1.14285714285714,2 +"rails-dom-testing",1.1395257959,2.3186509997,0.452605243,"https://salsa.debian.org/ruby-team/ruby-rails-dom-testing","https://github.com/rails/rails-dom-testing",3596.7865625,8,32,0,32,86,0,0,88,2,"2",1.8,1.97727272727273 +"rails-html-sanitizer",0.0035830645,1.4381559694,-0.2871912749,"https://salsa.debian.org/ruby-team/ruby-rails-html-sanitizer","https://github.com/rails/rails-html-sanitizer",3530.5188078704,6,25,0,27,142,0,0,143,2,"2",1.80645161290323,1.99300699300699 +"rails-i18n",-0.8873907002,1.4792293029,-1.4400451677,"https://salsa.debian.org/ruby-team/ruby-rails-i18n","https://github.com/svenfuchs/rails-i18n/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA +"rainbow",-0.0554541407,2.1809136318,-0.4874876801,"https://salsa.debian.org/ruby-team/ruby-rainbow","https://github.com/sickill/rainbow/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA +"rbnacl",-0.5101798059,1.8184409822,-1.1442616342,"https://salsa.debian.org/ruby-team/ruby-rbnacl","https://github.com/RubyCrypto/rbnacl",3765.2138425926,11,37,2,39,107,0,6,113,2,"2",1.77083333333333,1.94690265486726 +"rbpdf",0.3170747692,3.3087733487,-0.4838111804,"https://salsa.debian.org/ruby-team/ruby-rbpdf","https://github.com/naitoh/rbpdf/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA +"rchardet",0.8898007893,4.3708723994,-0.1239109738,"https://salsa.debian.org/ruby-team/ruby-rchardet","https://github.com/jmhodges/rchardet",5157.8658101852,2,16,0,14,39,0,0,42,4,"4",1.88888888888889,1.92857142857143 +"rdiscount",0.5400773203,2.7137511021,-0.1397503416,"https://salsa.debian.org/ruby-team/ruby-rdiscount","https://github.com/rtomayko/rdiscount",5495.3965277778,14,23,3,28,170,0,9,190,4,"4",1.62162162162162,1.89473684210526 +"re2",-0.3975240745,2.0675577643,-1.080838045,"https://salsa.debian.org/ruby-team/ruby-re2","https://github.com/mudge/re2.git",4891.9840277778,5,6,0,6,31,0,1,32,3,"3",1.54545454545455,1.96875 +"recaptcha",-0.7227524813,1.5115844498,-1.1563133628,"https://salsa.debian.org/ruby-team/ruby-recaptcha","https://github.com/ambethia/recaptcha",5167.5063425926,32,133,0,118,0,0,20,138,4,"4",1.80606060606061,1 +"recursive-open-struct",-0.9586694143,1.8658984093,-1.696474562,"https://salsa.debian.org/ruby-team/ruby-recursive-open-struct","https://github.com/aetherknight/recursive-open-struct/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA +"redcarpet",0.0453332853,0.8616945524,-0.2027621969,"https://salsa.debian.org/ruby-team/ruby-redcarpet","https://github.com/vmg/redcarpet/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA +"redcloth",0.3958422452,2.2802681181,-0.2616585591,"https://salsa.debian.org/ruby-team/ruby-redcloth","https://github.com/jgarber/redcloth.git",5745.4538541667,8,27,0,31,85,0,2,99,4,"4",1.77142857142857,1.85858585858586 +"redis-rb",-0.1845294704,1.6465311996,-0.5725594934,"https://salsa.debian.org/ruby-team/ruby-redis","https://github.com/redis/redis-rb/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA +"redis-actionpack",-0.8365151572,1.4579951576,-1.2916857062,"https://salsa.debian.org/ruby-team/ruby-redis-actionpack","https://github.com/redis-store/redis-actionpack",3755.356412037,8,18,0,15,48,0,0,50,2,"2",1.69230769230769,1.96 +"redis-namespace",-0.5136949026,1.5651978248,-1.007887329,"https://salsa.debian.org/ruby-team/ruby-redis-namespace","https://github.com/resque/redis-namespace",5080.3240046296,46,64,0,90,271,0,0,277,4,"4",1.58181818181818,1.97833935018051 +"ronn-ng",0.0051973803,1.3529280372,-0.5133229589,"https://salsa.debian.org/ruby-team/ruby-ronn","https://github.com/apjanke/ronn-ng",5091.8833101852,3,20,4,19,40,0,0,50,4,"4",1.8695652173913,1.8 +"sass-rails",0.1295459675,2.3430805193,-0.2869628621,"https://salsa.debian.org/ruby-team/ruby-sass-rails","https://github.com/rails/sass-rails",3032.8716550926,10,70,2,62,828,0,0,832,2,"2",1.875,1.99519230769231 +"seed-fu",-0.3406843156,2.6986297961,-1.1723771613,"https://salsa.debian.org/ruby-team/ruby-seed-fu","https://github.com/mbleigh/seed-fu",3639.382974537,1,34,0,23,185,0,4,196,2,"2",1.97142857142857,1.94387755102041 +"select2-rails",0.0255233967,4.0170630036,-1.0829307262,"https://salsa.debian.org/ruby-team/ruby-select2-rails","https://github.com/argerim/select2-rails",3178.7430787037,3,45,0,37,323,0,4,328,2,"2",1.9375,1.98475609756098 +"signet",-0.6999934393,1.7242691265,-1.2316883956,"https://salsa.debian.org/ruby-team/ruby-signet","https://github.com/googleapis/signet",4807.4255671296,28,44,4,52,165,0,1,167,3,"3",1.61111111111111,1.98802395209581 +"sinatra",0.3867492716,1.8300987882,-0.1759543833,"https://salsa.debian.org/ruby-team/ruby-sinatra","https://github.com/sinatra/sinatra.git",5774.2084027778,157,401,0,368,41,0,0,396,4,"4",1.71863799283154,1.10353535353535 +"slack-notifier",-0.2300777475,2.6813920387,-0.9614495819,"https://salsa.debian.org/ruby-team/ruby-slack-notifier","https://github.com/slack-notifier/slack-notifier.git",2800.9713773148,7,25,0,26,174,0,0,175,2,"2",1.78125,1.99428571428571 +"solve",-1.8731536972,0.3722546164,-2.3421355548,"https://salsa.debian.org/ruby-team/ruby-solve","https://github.com/berkshelf/solve",3205.9559722222,4,24,0,17,61,0,0,61,2,"2",1.85714285714286,2 +"sprockets",0.2127696789,2.1502629674,-0.2372190965,"https://salsa.debian.org/ruby-team/ruby-sprockets","https://github.com/rails/sprockets.git",3278.0454050926,50,229,0,213,572,0,0,665,2,"2",1.82078853046595,1.86015037593985 +"stomp",-0.0622865151,2.2785748082,-0.5399267706,"https://salsa.debian.org/ruby-team/ruby-stomp","https://github.com/stompgem/stomp.git",4485.6743055556,3,49,0,31,92,0,4,103,3,"3",1.94230769230769,1.89320388349515 +"svg-graph2",-0.3606208872,1.999901842,-1.0364827172,"https://salsa.debian.org/ruby-team/ruby-svg-graph","https://github.com/lumean/svg-graph2",5000.5990393519,3,24,0,20,18,0,1,29,4,"4",1.88888888888889,1.62068965517241 +"task_list",-0.7972452731,1.5304821718,-1.2730429771,"https://salsa.debian.org/ruby-team/ruby-task-list","https://github.com/deckar01/task_list.git",3500.9144675926,4,16,0,14,10,0,2,22,2,"2",1.8,1.45454545454545 +"test_declarative",-3.1861402959,-0.6802948039,-3.7322816142,"https://salsa.debian.org/ruby-team/ruby-test-declarative","https://github.com/svenfuchs/test_declarative/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA +"test-unit",0.5083159182,3.1187784557,-0.0204072698,"https://salsa.debian.org/ruby-team/ruby-test-unit","https://github.com/test-unit/test-unit/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA +"text",0.3951935457,2.8287836535,-0.1391551665,"https://salsa.debian.org/ruby-team/ruby-text","https://github.com/threedaymonk/text",2533.6334375,0,20,0,9,25,0,0,26,1,"1",2,1.96153846153846 +"thor",0.4898388928,3.0323114244,-0.1082643553,"https://salsa.debian.org/ruby-team/ruby-thor","https://github.com/erikhuda/thor/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA +"thread_safe",0.7899153314,3.4062016312,-0.0364056562,"https://salsa.debian.org/ruby-team/ruby-thread-safe","https://github.com/ruby-concurrency/thread_safe",1914.5871759259,2,18,1,17,28,0,0,34,1,"1",1.9,1.82352941176471 +"timecop",-1.6249475535,-0.136572147,-1.9770285904,"https://salsa.debian.org/ruby-team/ruby-timecop","https://github.com/travisjeffery/timecop/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA +"toml-rb",-1.0965997307,1.7054562066,-1.7254826934,"https://salsa.debian.org/ruby-team/ruby-toml-rb","https://github.com/emancu/toml-rb.git",3791.6442361111,5,30,0,29,61,0,0,61,3,"3",1.85714285714286,2 +"ruby-unf_ext",0.5249786091,2.442343707,-0.0572331883,"https://salsa.debian.org/ruby-team/ruby-unf-ext","https://github.com/knu/ruby-unf_ext",4837.9721180556,5,11,0,11,144,0,0,145,3,"3",1.6875,1.99310344827586 +"validates_url",-1.5783095032,0.6947261226,-2.1729142188,"https://salsa.debian.org/ruby-team/ruby-validate-url","https://github.com/perfectline/validates_url.git",4598.7266782407,25,34,0,47,141,0,0,144,3,"3",1.57627118644068,1.97916666666667 +"vcr",-1.8354081732,0.3458876474,-2.4299770711,"https://salsa.debian.org/ruby-team/ruby-vcr","https://github.com/vcr/vcr",5026.1477083333,86,97,0,152,774,0,33,823,4,"4",1.53005464480874,1.9404617253949 +"xpath",0.2253924511,2.6354082514,-0.4532834945,"https://salsa.debian.org/ruby-team/ruby-xpath","https://github.com/teamcapybara/xpath.git",4699.0999421296,4,29,0,22,77,0,0,77,3,"3",1.87878787878788,2 +"yajl-ruby",0.1342868737,1.2952090225,-0.1984486272,"https://salsa.debian.org/ruby-team/ruby-yajl","https://github.com/brianmario/yajl-ruby",4761.9604282407,20,41,0,45,266,0,0,272,3,"3",1.67213114754098,1.97794117647059 +"yaml_db",-1.6914754372,0.8448802104,-2.2259427821,"https://salsa.debian.org/ruby-team/ruby-yaml-db","https://github.com/yamldb/yaml_db",4943.5546759259,10,17,0,20,191,0,3,198,3,"3",1.62962962962963,1.96464646464646 +"yell",-2.2945770851,0.1365084458,-2.7815318187,"https://salsa.debian.org/ruby-team/ruby-yell","https://github.com/rudionrails/yell",3852.7088541667,5,10,0,12,42,0,5,47,3,"3",1.66666666666667,1.8936170212766 +"rumur",-3.5360734663,-0.8290791088,-4.2689394833,"https://github.com/Smattr/rumur.git","https://github.com/Smattr/rumur.git",3378.9262037037,0,5,0,2,8,0,0,8,2,"2",2,2 +"sagetex",-0.1549904573,0.5108732423,-0.363447528,"https://salsa.debian.org/tex-team/sagetex","https://github.com/dandrake/sagetex/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA +"salmon",-0.3649631387,1.5121758625,-0.9283685843,"https://salsa.debian.org/med-team/salmon","https://github.com/COMBINE-lab/salmon/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA +"samizdat",-2.1436226321,0.0590823844,-2.8619607448,"https://salsa.debian.org/ruby-team/samizdat","https://github.com/angdraug/samizdat",3433.2320138889,0,3,0,1,2,0,0,2,2,"2",2,2 +"samplv1",0.1318819979,2.3880742784,-0.4301804768,"https://salsa.debian.org/multimedia-team/samplv1","https://github.com/rncbc/samplv1.git",4120.8180671296,1,15,0,6,28,0,3,32,3,"3",1.9375,1.875 +"sandsifter",-0.8702992262,1.6152724713,-1.5907539971,"https://salsa.debian.org/pkg-security-team/sandsifter","https://github.com/rigred/sandsifter",736.7519907407,4,12,0,7,12,0,0,15,1,"1",1.75,1.8 +"sasview",-1.0627164618,0.2502972617,-1.4248935984,"https://salsa.debian.org/science-team/sasview","https://github.com/SasView/sasview.git",5783.1973842593,20,119,0,59,30,0,22,86,4,"4",1.85611510791367,1.34883720930233 +"scap-workbench",-0.3629110649,2.6509329851,-1.2724650562,"https://salsa.debian.org/debian/scap-workbench","https://github.com/OpenSCAP/scap-workbench.git",4660.2892824074,13,37,0,20,138,0,7,146,3,"3",1.74,1.94520547945205 +"schismtracker",0.2030503767,1.1666319026,-0.2400483232,"https://salsa.debian.org/multimedia-team/schism","https://github.com/schismtracker/schismtracker",4666.6107291667,15,42,0,31,165,0,6,173,3,"3",1.73684210526316,1.95375722543353 +"coordgenlibs",-0.6657659236,1.5707387755,-1.125402023,"https://salsa.debian.org/science-team/schroedinger-coordgenlibs","https://github.com/schrodinger/coordgenlibs.git",2268.1054282408,12,9,0,14,28,0,0,29,1,"1",1.42857142857143,1.96551724137931 +"scram",0.0112378447,2.4451248274,-0.690432285,"https://salsa.debian.org/science-team/scram","https://github.com/rakhimov/scram.git",1943.5289930556,2,6,0,3,21,0,1,22,1,"1",1.75,1.95454545454545 +"scrcpy",-0.0596273247,2.3700526091,-0.5833876176,"https://salsa.debian.org/yangfl-guest/scrcpy","https://github.com/Genymobile/scrcpy",2194.2825462963,140,11,2,121,680,0,13,788,1,"1",1.07284768211921,1.86294416243655 +"screenFetch",0.8393718554,3.4206935722,0.0064658687,"https://salsa.debian.org/debian/screenfetch","https://github.com/KittyKatt/screenFetch.git",4948.5768518519,38,182,0,141,38,0,5,173,3,"3",1.82727272727273,1.21965317919075 +"screengrab",0.1432641642,1.1078243645,-0.1380237462,"https://salsa.debian.org/lxqt-team/screengrab","https://github.com/lxqt/screengrab.git",4829.5888194445,59,21,0,54,65,0,0,87,3,"3",1.2625,1.74712643678161 +"scrot",0.5207763404,1.4883547353,0.0924816727,"https://salsa.debian.org/debian/scrot","https://github.com/resurrecting-open-source-projects/scrot",1711.9000347222,19,22,0,23,60,0,0,64,1,"1",1.53658536585366,1.9375 +"scrypt",-0.3160075827,1.9170411595,-0.7532305313,"https://salsa.debian.org/debian/scrypt","https://github.com/Tarsnap/scrypt.git",4121.4724652778,3,11,0,10,45,0,0,46,3,"3",1.78571428571429,1.97826086956522 +"sdate",-0.1644092081,1.9663758042,-0.7580677936,"https://github.com/df7cb/sdate","https://github.com/df7cb/sdate",5170.3786689815,3,6,0,6,13,0,0,14,4,"4",1.66666666666667,1.92857142857143 +"seascope",0.1418549141,3.3764775459,-0.9515590832,"https://salsa.debian.org/debian/seascope","https://github.com/anilFree/seascope.git",2921.7499305556,1,15,0,6,6,0,0,7,2,"2",1.9375,1.85714285714286 +"selinux",-1.9466562158,0.7511457525,-2.5791957587,"https://salsa.debian.org/selinux-team/secilc","https://github.com/SELinuxProject/selinux.git",5593.8026157407,179,30,0,124,83,0,12,182,4,"4",1.14354066985646,1.45604395604396 +"THC-Archive",1.9359167993,4.4474577245,0.8251568889,"https://salsa.debian.org/debian/secure-delete","https://github.com/hackerschoice/THC-Archive",1834.166099537,2,3,0,3,7,0,0,8,1,"1",1.6,1.875 +"selinux",0.7649754209,3.3984155889,-0.1297129167,"https://salsa.debian.org/selinux-team/selinux-python","https://github.com/SELinuxProject/selinux.git",5593.8026157407,179,30,0,124,83,0,12,182,4,"4",1.14354066985646,1.45604395604396 +"semi",-0.0012315826,0.7304306594,-0.3636303627,"https://salsa.debian.org/debian/semi","https://github.com/wanderlust/semi",5270.9675347222,3,13,0,9,12,0,0,14,4,"4",1.8125,1.85714285714286 +"sendemail",0.5149987593,2.580274247,-0.1001009863,"https://github.com/mogaal/sendemail","https://github.com/mogaal/sendemail",1084.8616782407,0,2,0,2,42,0,0,43,1,"1",2,1.97674418604651 +"sendxmpp",1.6949802972,3.915419876,0.6723168015,"https://salsa.debian.org/xmpp-team/sendxmpp","https://github.com/lhost/sendxmpp.git",3008.6224768519,2,6,0,3,52,0,0,52,2,"2",1.75,2 +"ser2net",0.6438108629,1.9333620158,-0.0355562238,"https://salsa.debian.org/debian/ser2net","https://github.com/cminyard/ser2net",5671.7052083333,14,9,0,15,113,0,0,117,4,"4",1.39130434782609,1.96581196581197 +"serd",0.7042703147,2.9113947553,0.0669085772,"https://salsa.debian.org/multimedia-team/serd","https://github.com/drobilla/serd.git",4700.7071990741,5,1,0,6,28,0,0,29,3,"3",1.16666666666667,1.96551724137931 +"serverspec-runner",-1.6557747415,0.9321001072,-2.3818100795,"https://salsa.debian.org/ruby-team/serverspec-runner","https://github.com/hiracy/serverspec-runner",3100.2933101852,2,5,0,2,5,0,0,5,2,"2",1.71428571428571,2 +"setBfree",0.0170022664,2.0259314608,-0.4587247273,"https://salsa.debian.org/multimedia-team/setbfree","https://github.com/pantherb/setBfree.git",3675.3818055556,8,6,0,10,61,0,0,61,2,"2",1.42857142857143,2 +"shapelib",0.2832338511,1.1530187147,-0.0270271594,"https://salsa.debian.org/debian-gis-team/shapelib","https://github.com/OSGeo/shapelib.git",5762.8618865741,4,13,0,16,34,0,0,36,4,"4",1.76470588235294,1.94444444444444 +"shellinabox",1.4229551917,3.5460511425,0.4536040301,"https://github.com/shellinabox/shellinabox/","https://github.com/shellinabox/shellinabox",3681.1884027778,7,26,0,21,143,0,3,152,2,"2",1.78787878787879,1.94078947368421 +"shortuuid",-0.4574144902,1.8821725228,-1.1753645345,"https://salsa.debian.org/python-team/packages/shortuuid","https://github.com/skorokithakis/shortuuid.git",4431.3497800926,19,17,0,30,96,0,0,97,3,"3",1.47222222222222,1.98969072164948 +"shotcut",-0.0371835128,1.3895028111,-0.3956647911,"https://salsa.debian.org/multimedia-team/shotcut","https://github.com/mltframework/shotcut",4437.0470486111,40,29,1,54,300,0,0,337,3,"3",1.42028985507246,1.89020771513353 +"should.js",-1.54067697,-0.4927936502,-1.7632687804,"https://salsa.debian.org/js-team/should.js","https://github.com/shouldjs/should.js.git",3267.8598842593,8,77,0,66,165,0,6,211,2,"2",1.90588235294118,1.78199052132701 +"simple-obfs",-0.4921488347,2.3362837337,-1.2782165107,"https://salsa.debian.org/bridges-team/simple-obfs","https://github.com/shadowsocks/simple-obfs.git",958.8196412037,21,12,0,23,215,0,0,217,1,"1",1.36363636363636,1.99078341013825 +"simple-tpm-pk11",-0.6002403517,1.7339981128,-1.3361738434,"https://salsa.debian.org/debian/simple-tpm-pk11","https://github.com/ThomasHabets/simple-tpm-pk11",3536.4266898148,8,13,0,16,52,0,1,53,2,"2",1.61904761904762,1.9811320754717 +"simpleburn",1.1321508597,4.0273397461,0.0153846721,"https://github.com/mati75/simpleburn.git","https://github.com/mati75/simpleburn.git",1916.8323611111,0,3,0,2,4,0,0,5,1,"1",2,1.8 +"simpleeval",-1.0513943081,0.6565241205,-1.3725768937,"https://salsa.debian.org/tryton-team/simpleeval","https://github.com/danthedeckie/simpleeval.git",3363.307037037,10,23,0,21,94,0,0,95,2,"2",1.6969696969697,1.98947368421053 +"simplejson",0.7781612347,2.530704791,0.1122369737,"https://salsa.debian.org/python-team/packages/simplejson","https://github.com/simplejson/simplejson",5762.0850115741,6,42,0,35,85,0,0,111,4,"4",1.875,1.76576576576577 +"ssr",0.5074767944,2.5172653323,-0.0714681759,"https://salsa.debian.org/multimedia-team/simplescreenrecorder","https://github.com/MaartenBaert/ssr",3464.0590972222,13,48,0,42,288,0,1,318,2,"2",1.78688524590164,1.90566037735849 +"simplesnap",-0.3478600805,2.4893157768,-1.2512484875,"https://github.com/jgoerzen/simplesnap","https://github.com/jgoerzen/simplesnap",3116.7912384259,1,6,0,4,24,0,0,24,2,"2",1.85714285714286,2 +"sinntp",-0.7486132539,2.2241911903,-1.864431269,"https://salsa.debian.org/python-team/packages/sinntp","https://github.com/jwilk/sinntp.git",5461.030625,0,2,0,2,3,0,0,4,4,"4",2,1.75 +"skiboot",-1.2267708754,0.8083409101,-1.8023566904,"https://salsa.debian.org/debian/skiboot","https://github.com/open-power/skiboot.git",3435.5121180556,156,19,0,99,117,0,0,167,2,"2",1.10857142857143,1.70059880239521 +"dict",-0.1341965123,0.4940218282,-0.3529875318,"https://salsa.debian.org/debian/skkdic","https://github.com/skk-dev/dict",2069.106724537,1,13,0,14,27,0,0,27,1,"1",1.92857142857143,2 +"skktools",-0.7739115557,-0.492281698,-0.8304382583,"https://salsa.debian.org/debian/skktools","https://github.com/skk-dev/skktools",4603.9943402778,1,14,0,9,15,0,0,15,3,"3",1.93333333333333,2 +"sl",0.323098945,1.3268829075,-0.065447292,"https://salsa.debian.org/debian/sl","https://github.com/mtoyoda/sl",1446.5538657407,0,15,0,10,116,0,0,116,1,"1",2,2 +"sleef",-2.2104947128,0.3306322864,-2.7673859805,"https://salsa.debian.org/science-team/sleef","https://github.com/shibatch/sleef.git",2789.4703935185,24,7,0,30,20,0,2,45,2,"2",1.2258064516129,1.44444444444444 +"sleuthkit",0.248789794,0.7322070572,0.0073823657,"https://salsa.debian.org/pkg-security-team/sleuthkit","https://github.com/sleuthkit/sleuthkit",5541.6815740741,21,144,0,79,39,0,2,97,4,"4",1.87272727272727,1.4020618556701 +"slowhttptest",-0.5285418268,1.6541713882,-0.9836957935,"https://salsa.debian.org/debian/slowhttptest","https://github.com/shekyan/slowhttptest",4436.458900463,5,15,0,11,62,0,3,65,3,"3",1.75,1.95384615384615 +"smarty",0.3504374167,1.5540551587,-0.1505110391,"https://salsa.debian.org/debian/smarty3","https://github.com/smarty-php/smarty.git",3318.9346180556,45,52,0,58,489,0,1,510,2,"2",1.5360824742268,1.95882352941176 +"smbmap",-0.0942111377,1.2729571655,-0.3894550484,"https://salsa.debian.org/pkg-security-team/smbmap","https://github.com/ShawnDEvans/smbmap.git",3137.7212731482,5,16,0,14,95,0,2,99,2,"2",1.76190476190476,1.95959595959596 +"smcroute",-0.5495305171,0.137923259,-0.8122481411,"https://salsa.debian.org/debian/smcroute","https://github.com/troglobit/smcroute.git",5055.7766087963,11,24,0,26,82,0,0,90,4,"4",1.68571428571429,1.91111111111111 +"SmokePing",0.1909583252,0.4951169655,-0.0114998503,"https://salsa.debian.org/debian/smokeping","https://github.com/oetiker/SmokePing.git",5773.8930902778,41,36,0,63,259,0,13,284,4,"4",1.46753246753247,1.91197183098592 +"snap",-0.2880010482,1.7199246286,-0.9244808984,"https://salsa.debian.org/med-team/snap-aligner","https://github.com/amplab/snap.git",3911.3341898148,1,64,0,10,89,0,0,89,3,"3",1.98461538461538,2 +"snimpy",-1.1710720581,-0.3633696382,-1.3515477674,"https://salsa.debian.org/debian/snimpy","https://github.com/vincentbernat/snimpy/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA +"snoopy",1.1669824916,2.8753833581,0.3279585504,"https://salsa.debian.org/pkg-security-team/snoopy","https://github.com/a2o/snoopy",3060.3719097222,6,34,4,21,133,0,0,138,2,"2",1.85,1.96376811594203 +"SoapyHackRF",0.1605098081,2.6673565763,-0.324555585,"https://salsa.debian.org/debian-hamradio-team/soapysdr/soapyhackrf","https://github.com/pothosware/SoapyHackRF.git",2556.4767361111,1,9,0,7,36,0,5,41,1,"1",1.9,1.8780487804878 +"SoapyOsmo",0.1156871694,2.5406057768,-0.3339209238,"https://salsa.debian.org/debian-hamradio-team/soapysdr/soapyosmo","https://github.com/pothosware/SoapyOsmo.git",2779.5272569445,0,2,0,2,14,0,2,16,2,"2",2,1.875 +"SoapySDR",0.5757029294,3.2715487378,-0.2009342982,"https://salsa.debian.org/debian-hamradio-team/soapysdr/soapysdr","https://github.com/pothosware/SoapySDR.git",3219.8508912037,4,27,0,26,135,0,20,166,2,"2",1.87096774193548,1.81325301204819 +"solarpowerlog",-1.7795970498,0.0950109385,-2.3705182782,"https://github.com/coldtobi/solarpowerlog/tree/debian","https://github.com/coldtobi/solarpowerlog",5143.7188310185,1,8,0,1,1,0,1,3,4,"4",1.88888888888889,1.33333333333333 +"solvespace",0.3400078311,2.4750974835,-0.3014099682,"https://salsa.debian.org/science-team/solvespace","https://github.com/solvespace/solvespace/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA +"sombok",0.3006788873,1.8374945588,-0.0607142369,"https://salsa.debian.org/kolter/sombok","https://github.com/hatukanezumi/sombok",1612.4445949074,0,1,0,1,4,0,0,4,1,"1",2,2 +"sonata",0.2905505595,0.9576245442,-0.0885666061,"https://salsa.debian.org/mpd-team/sonata","https://github.com/multani/sonata",4950.7015162037,15,21,0,23,50,0,0,60,3,"3",1.58333333333333,1.83333333333333 +"sonic",0.3436339172,1.4474196373,0.0197565432,"https://salsa.debian.org/a11y-team/sonic","https://github.com/waywardgeek/sonic",4727.1402199074,3,21,0,12,42,0,0,42,3,"3",1.875,2 +"sope",-0.250285844,0.9987661956,-0.7280518867,"https://salsa.debian.org/debian/sope","https://github.com/inverse-inc/sope.git",4884.8710648148,9,32,0,24,32,0,0,35,3,"3",1.78048780487805,1.91428571428571 +"soundkonverter",1.0908472726,2.4748241992,0.3743578972,"https://salsa.debian.org/qt-kde-team/extras/soundkonverter","https://github.com/dfaust/soundkonverter.git",4518.0852893519,5,14,0,15,97,0,5,103,3,"3",1.73684210526316,1.94174757281553 +"spectrwm",0.8740320474,3.3995660037,-0.1106287738,"https://salsa.debian.org/debian/spectrwm","https://github.com/conformal/spectrwm",5428.7537962963,35,24,0,38,333,0,14,353,4,"4",1.40677966101695,1.94334277620397 +"sphinxcontrib-bibtex",0.111160598,2.1131827213,-0.4197298069,"https://salsa.debian.org/science-team/sphinxcontrib-bibtex","https://github.com/mcmtroffaes/sphinxcontrib-bibtex.git",4544.6493055556,11,9,0,16,150,0,0,150,3,"3",1.45,2 +"restbuilder",-1.1764165162,1.2846690356,-1.6755940115,"https://salsa.debian.org/python-team/packages/sphinxcontrib-restbuilder","https://github.com/sphinx-contrib/restbuilder.git",2987.8306828704,1,10,0,8,23,0,0,25,2,"2",1.90909090909091,1.92 +"spelling",-0.7874116783,1.0287481645,-1.4199296239,"https://salsa.debian.org/python-team/packages/sphinxcontrib-spelling","https://github.com/sphinx-contrib/spelling",5270.8333333333,12,76,0,67,83,0,0,120,4,"4",1.86363636363636,1.69166666666667 +"sphinxcontrib-websupport",-1.489015386,0.092912366,-1.8959476069,"https://salsa.debian.org/python-team/packages/sphinxcontrib-websupport","https://github.com/sphinx-doc/sphinxcontrib-websupport",4818.6938425926,8,17,0,18,21,0,0,29,3,"3",1.68,1.72413793103448 +"sphinxtesters",-1.0316070726,1.4478444724,-1.604600739,"https://salsa.debian.org/python-team/packages/sphinxtesters","https://github.com/matthew-brett/sphinxtesters.git",2155.7952314815,0,3,0,2,5,0,0,5,1,"1",2,2 +"spin-debian",-0.5307239904,2.5263569152,-1.4016281412,"https://github.com/thomaslee/spin-debian","https://github.com/thomaslee/spin-debian",1934.3454282407,2,4,0,2,3,0,0,3,1,"1",1.66666666666667,2 +"sqitch",-1.0987496818,-0.3717057014,-1.2899258645,"https://salsa.debian.org/perl-team/modules/packages/sqitch","https://github.com/sqitchers/sqitch/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA +"sqldeveloper-package",0.3178462622,2.5512521122,-0.5498064554,"https://github.com/lazarusllong/sqldeveloper-package.git","https://github.com/lazarusllong/sqldeveloper-package.git",2130.3049189815,0,3,0,1,6,0,0,6,1,"1",2,2 +"sqlgrey-debian",-0.447394697,1.287594037,-1.0928861268,"https://github.com/bobek/sqlgrey-debian","https://github.com/bobek/sqlgrey-debian",4172.3835300926,1,3,0,2,1,0,0,2,3,"3",1.75,1.5 +"sqlmap",-0.0436656036,1.2298763794,-0.4076774194,"https://salsa.debian.org/pkg-security-team/sqlmap","https://github.com/sqlmapproject/sqlmap.git",5537.8440625,75,67,0,118,120,0,6,236,4,"4",1.47183098591549,1.50847457627119 +"ssh-audit",0.2128051096,2.7100037355,-0.3787946632,"https://salsa.debian.org/debian/ssh-audit","https://github.com/jtesta/ssh-audit.git",2897.0719328704,19,7,0,23,122,0,13,141,2,"2",1.26923076923077,1.86524822695035 +"sshuttle",0.4686212873,1.5902040128,-0.0562158764,"https://salsa.debian.org/debian/sshuttle","https://github.com/sshuttle/sshuttle.git",4975.0844675926,104,46,0,119,319,0,1,380,3,"3",1.30666666666667,1.83947368421053 +"sslsplit",0.0482855639,2.1228996274,-0.6371278291,"https://salsa.debian.org/debian/sslsplit","https://github.com/droe/sslsplit",4093.9351851852,9,20,2,17,164,0,0,170,3,"3",1.68965517241379,1.96470588235294 +"subliminal",0.7190070506,3.1421902787,-0.2079240806,"https://salsa.debian.org/python-team/packages/subliminal","https://github.com/Diaoul/subliminal.git",3790.6726273148,11,36,0,30,562,0,0,566,3,"3",1.76595744680851,1.99293286219081 +"suds",-0.2061376952,0.1335002243,-0.2803381261,"https://salsa.debian.org/python-team/packages/suds","https://github.com/suds-community/suds.git",3431.6421990741,14,23,0,26,80,0,0,87,2,"2",1.62162162162162,1.91954022988506 +"sundials",0.1304834937,1.329515137,-0.4214324267,"https://salsa.debian.org/science-team/sundials","https://github.com/LLNL/sundials.git",5750.416412037,17,59,0,19,126,0,1,131,4,"4",1.77631578947368,1.9618320610687 +"sup",0.7289408703,1.645644064,0.2014294659,"https://salsa.debian.org/ruby-team/sup-mail","https://github.com/sup-heliotrope/sup/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA +"svgpp",-1.8854559409,-0.5385173138,-2.2188275477,"https://salsa.debian.org/debian/svgpp","https://github.com/svgpp/svgpp.git",3480.6248726852,6,8,0,8,55,0,1,56,2,"2",1.57142857142857,1.98214285714286 +"svgtune",0.1366019906,2.760378779,-0.708785107,"http://github.com/yarikoptic/svgtune","http://github.com/yarikoptic/svgtune",4268.4841550926,0,2,0,0,0,0,0,0,3,"3",2,NA +"svgwrite",0.1630015143,2.8978314663,-0.6431657526,"https://salsa.debian.org/python-team/packages/svgwrite","https://github.com/mozman/svgwrite.git",2562.4058912037,4,22,0,19,110,0,0,115,1,"1",1.84615384615385,1.95652173913043 +"svn2git",0.0735704043,2.214779927,-0.6989156967,"https://salsa.debian.org/debian/svn-all-fast-export","https://github.com/svn-all-fast-export/svn2git.git",5311.2481365741,28,29,0,32,96,0,0,107,4,"4",1.50877192982456,1.89719626168224 +"svtplay-dl",-0.259583484,1.4909319758,-0.7330050577,"https://salsa.debian.org/olof/svtplay-dl","https://github.com/spaam/svtplay-dl",4669.1490162037,48,26,3,52,53,0,0,92,3,"3",1.35135135135135,1.57608695652174 +"svxlink",-0.3635018341,1.3160115906,-0.862809513,"https://salsa.debian.org/debian-hamradio-team/svxlink","https://github.com/sm0svx/svxlink/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA +"swaks",-0.0249524642,0.3218579009,-0.1486439733,"https://salsa.debian.org/debian/swaks","https://github.com/jetmore/swaks",5448.0600694445,0,9,5,5,49,0,0,49,4,"4",2,2 +"swami",0.1476526288,1.5183148814,-0.4624982263,"https://salsa.debian.org/multimedia-team/swami","https://github.com/swami/swami",4547.4787962963,6,10,0,8,16,0,0,19,3,"3",1.625,1.84210526315789 +"swauth",-2.4254901848,-0.8570793139,-2.7795442667,"https://salsa.debian.org/openstack-team/services/swauth","https://github.com/openstack/swauth.git",3045.1673958333,5,41,0,20,0,0,0,20,2,"2",1.89130434782609,1 +"swayidle",-0.101420118,2.2036420089,-0.6198513899,"https://salsa.debian.org/swaywm-team/swayidle","https://github.com/swaywm/swayidle",1867.500775463,24,22,0,36,149,0,0,156,1,"1",1.47826086956522,1.9551282051282 +"swift",-0.7448605494,-0.5081147887,-0.8497485173,"https://salsa.debian.org/openstack-team/services/swift","https://github.com/openstack/swift.git",4902.7891898148,50,447,0,293,35,0,0,321,3,"3",1.89939637826962,1.10903426791277 +"synaptic",4.0786320856,4.6212205168,3.6414737103,"https://github.com/mvo5/synaptic","https://github.com/mvo5/synaptic",5665.1249768519,20,60,0,45,96,0,2,108,4,"4",1.75,1.88888888888889 +"tappy",-0.7057840569,2.2385171659,-1.5015511284,"https://salsa.debian.org/python-team/packages/tap.py","https://github.com/python-tap/tappy",3537.627025463,10,7,0,13,34,0,0,34,2,"2",1.41176470588235,2 +"tcpflow",0.1993321539,0.7688453693,-0.0915379508,"https://salsa.debian.org/debian/tcpflow","https://github.com/simsong/tcpflow.git",4133.2346875,26,36,0,41,169,0,0,171,3,"3",1.58064516129032,1.98830409356725 +"tcpslice",0.3358455905,2.6360959654,-0.570915695,"https://salsa.debian.org/debian/tcpslice","https://github.com/the-tcpdump-group/tcpslice",1218.7178356482,4,7,0,9,17,0,0,18,1,"1",1.63636363636364,1.94444444444444 +"tdc",-0.5860347644,1.7220497679,-1.1918576951,"https://github.com/MTecknology/tdc","https://github.com/MTecknology/tdc",2078.2080208333,1,4,0,1,3,0,0,3,1,"1",1.8,2 +"tdiary-contrib",-1.4993548568,-0.3330069572,-2.0474169755,"https://salsa.debian.org/ruby-team/tdiary-contrib","https://github.com/tdiary/tdiary-contrib",5617.5064699074,4,81,0,39,47,0,0,49,4,"4",1.95294117647059,1.95918367346939 +"tdiary-style-gfm",-3.85195761,-1.6209873018,-4.3352117054,"https://salsa.debian.org/ruby-team/tdiary-style-gfm","https://github.com/tdiary/tdiary-style-gfm",3042.2103356482,2,13,0,10,14,0,0,14,2,"2",1.86666666666667,2 +"tea-qt",-0.2810310835,0.1682947168,-0.470037759,"https://salsa.debian.org/debian/tea","https://github.com/psemiletov/tea-qt.git",2860.1480092593,4,9,0,7,18,0,1,21,2,"2",1.69230769230769,1.85714285714286 +"teckit",2.1261637138,6.076788803,0.7450555927,"https://github.com/debian-tex/teckit","https://github.com/debian-tex/teckit",2563.6115277778,1,6,0,2,1,0,0,3,1,"1",1.85714285714286,1.33333333333333 +"tegaki",1.3618120507,5.4067459557,0.1410792866,"https://salsa.debian.org/debian/tegaki-zinnia-japanese","https://github.com/tegaki/tegaki.git",5118.3927777778,1,17,0,7,18,0,0,21,4,"4",1.94444444444444,1.85714285714286 +"terminado",0.1170410576,1.292034871,-0.1639482973,"https://salsa.debian.org/python-team/packages/terminado","https://github.com/jupyter/terminado",3771.3957407407,25,31,0,38,96,0,0,101,3,"3",1.55357142857143,1.95049504950495 +"termshark",-0.7902341917,1.4608630566,-1.2282898458,"https://salsa.debian.org/go-team/packages/termshark","https://github.com/gcla/termshark.git",1476.2094328704,6,14,0,14,67,0,0,72,1,"1",1.7,1.93055555555556 +"tifffile",-0.4950191398,1.0954022518,-0.9432954038,"https://salsa.debian.org/python-team/packages/tifffile","https://github.com/cgohlke/tifffile.git",1876.5951851852,0,2,0,1,107,0,0,107,1,"1",2,2 +"tigervnc",0.3860499518,0.9771386342,0.0684855341,"https://salsa.debian.org/debian-remote-team/tigervnc","https://github.com/TigerVNC/tigervnc.git",5713.2161226852,57,92,0,111,563,0,20,660,4,"4",1.61744966442953,1.8530303030303 +"tikzit",-0.3160832668,1.7178404043,-0.77589652,"https://salsa.debian.org/debian/tikzit","https://github.com/tikzit/tikzit.git",4273.8409027778,1,14,0,8,114,0,0,115,3,"3",1.93333333333333,1.99130434782609 +"tiledarray",-1.7374267908,0.1767686338,-2.351826242,"https://salsa.debian.org/debichem-team/tiledarray","https://github.com/ValeevGroup/tiledarray.git",5618.1119675926,7,39,0,21,38,0,5,43,4,"4",1.84782608695652,1.88372093023256 +"tktable",0.3811226337,2.9724908262,-0.2247277525,"https://salsa.debian.org/tcltk-team/tk-table","https://github.com/wjoye/tktable",2301.1677546296,2,6,0,3,5,0,0,5,1,"1",1.75,2 +"python-tldp",-2.9387752686,-1.0847198188,-3.3226946918,"https://github.com/tLDP/python-tldp","https://github.com/tLDP/python-tldp",2447.0141319445,0,4,0,2,4,0,0,4,1,"1",2,2 +"tldr.py",-0.8494191178,1.5859020327,-1.3735854961,"https://salsa.debian.org/python-team/packages/tldr-py","https://github.com/lord63/tldr.py",1740.1593055556,4,6,0,6,33,0,0,33,1,"1",1.6,2 +"tlf",-0.8747316419,-0.5145883819,-0.9886468624,"https://salsa.debian.org/debian-hamradio-team/tlf","https://github.com/Tlf/tlf.git",5111.2798263889,15,21,0,19,45,0,2,47,4,"4",1.58333333333333,1.95744680851064 +"tootle",1.2711208148,4.7692261317,-0.0231156554,"https://salsa.debian.org/debian/tootle","https://github.com/bleakgrey/tootle.git",1706.1450925926,21,13,0,23,214,0,0,214,1,"1",1.38235294117647,2 +"torbrowser-launcher",0.2254493944,0.4690081374,0.0615930109,"https://salsa.debian.org/pkg-privacy-team/torbrowser-launcher","https://github.com/micahflee/torbrowser-launcher",3941.4624421296,20,66,6,66,20,0,1,80,3,"3",1.76744186046512,1.25 +"toro",-2.2006489719,0.2918073361,-2.7668191631,"https://salsa.debian.org/debian/toro","https://github.com/ajdavis/toro/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA +"totalopenstation",-0.3889221766,1.015672648,-0.7332210243,"https://salsa.debian.org/debian-gis-team/totalopenstation","https://github.com/totalopenstation/totalopenstation.git",3856.5791319445,6,8,0,10,14,0,0,20,3,"3",1.57142857142857,1.7 +"traitlets",0.2529500243,1.8629238208,-0.0962338622,"https://salsa.debian.org/python-team/packages/traitlets","https://github.com/ipython/traitlets.git",5659.0350347222,36,89,0,97,252,0,0,265,4,"4",1.712,1.95094339622642 +"twolame",0.8417112782,2.6067569755,0.181912311,"https://salsa.debian.org/multimedia-team/twolame","https://github.com/njh/twolame",5003.7664467593,10,10,2,13,33,0,0,33,4,"4",1.5,2 +"txt2html",0.7774259234,2.1221283602,0.106308761,"https://salsa.debian.org/debian/txt2html","https://github.com/resurrecting-open-source-projects/txt2html",5316.6490856482,1,4,0,2,4,0,0,4,4,"4",1.8,2 +"txt2man",0.4090645621,1.519569464,-0.1442456476,"https://salsa.debian.org/debian/txt2man","https://github.com/mvertes/txt2man",2424.6791435185,2,9,0,9,19,0,0,19,1,"1",1.81818181818182,2 +"txt2tags",0.0507302842,1.0615675266,-0.3853719858,"https://salsa.debian.org/python-team/packages/txt2tags","https://github.com/txt2tags/txt2tags.git",5549.6046296296,9,22,0,3,36,0,1,37,4,"4",1.70967741935484,1.97297297297297 +"txWS",-1.4288081047,1.2079142338,-2.0336181053,"https://salsa.debian.org/python-team/packages/txws","https://github.com/MostAwesomeDude/txWS",4288.2085763889,2,10,0,9,37,0,0,37,3,"3",1.83333333333333,2 +"txZMQ",-0.6021876626,0.9002822086,-1.0188293115,"https://salsa.debian.org/python-team/packages/txzmq","https://github.com/smira/txZMQ",3989.2474074074,3,25,0,17,61,0,0,62,3,"3",1.89285714285714,1.98387096774194 +"typogrify",-0.5841407904,1.9099456866,-1.1786502144,"https://salsa.debian.org/python-team/packages/typogrify","https://github.com/mintchaos/typogrify",4964.5992708333,2,13,0,12,50,0,0,50,3,"3",1.86666666666667,2 +"u-msgpack-python",0.71036009,3.6137824666,-0.1082167429,"https://salsa.debian.org/python-team/packages/u-msgpack-python","https://github.com/vsergeev/u-msgpack-python",3518.0095949074,11,3,1,10,40,0,0,40,2,"2",1.21428571428571,2 +"uap-core",-1.4950577768,0.2195779264,-1.9007872982,"https://salsa.debian.org/debian/uap-core","https://github.com/ua-parser/uap-core.git",3378.7186458333,35,224,0,172,383,0,0,428,2,"2",1.86486486486486,1.89485981308411 +"udisks",1.637930268,2.6755087394,1.0040393895,"https://salsa.debian.org/utopia-team/udisks2","https://github.com/storaged-project/udisks",5742.1701388889,64,76,1,109,96,0,1,178,4,"4",1.54285714285714,1.53932584269663 +"ufo2otf-debian",-1.1799643582,1.8587549116,-1.9214944844,"https://github.com/Rudloff/ufo2otf-debian","https://github.com/Rudloff/ufo2otf-debian",893.8441666667,1,3,0,3,1,0,0,3,1,"1",1.75,1.33333333333333 +"UglifyJS2",-0.4631278916,1.3138425047,-0.9110194583,"https://salsa.debian.org/js-team/uglifyjs","https://github.com/mishoo/UglifyJS2",3886.0955208333,82,71,0,115,88,0,0,192,3,"3",1.4640522875817,1.45833333333333 +"UglifyJS2",1.1390181603,3.3421341091,0.221625202,"https://salsa.debian.org/js-team/uglifyjs","https://github.com/mishoo/UglifyJS2",3886.0955208333,82,71,0,115,88,0,0,192,3,"3",1.4640522875817,1.45833333333333 +"ukui-sidebar",-3.8890227903,-1.5419346693,-4.3399549698,"https://github.com/ukui/ukui-sidebar","https://github.com/ukui/ukui-sidebar",770.8421412037,16,52,0,28,0,0,0,28,1,"1",1.76470588235294,1 +"unshield",1.079201816,2.9040511207,0.2466958012,"https://salsa.debian.org/games-team/unshield","https://github.com/twogood/unshield.git",5774.0918055556,2,32,0,28,33,0,0,49,4,"4",1.94117647058824,1.6734693877551 +"Unworkable",-0.495607915,1.1078529483,-1.0387863531,"https://salsa.debian.org/debian/unworkable","https://github.com/niallo/Unworkable.git",3168.162650463,2,5,0,2,2,0,0,3,2,"2",1.71428571428571,1.66666666666667 +"usbauth-all",-0.84864584,2.3248338051,-1.5774396132,"https://salsa.debian.org/debian/usbauth","https://github.com/kochstefan/usbauth-all.git",2917.2837384259,3,5,0,2,7,0,0,7,2,"2",1.625,2 +"usbauth-all",-1.3618380248,0.1189121883,-1.684268531,"https://salsa.debian.org/debian/usbauth-notifier","https://github.com/kochstefan/usbauth-all.git",2917.2837384259,3,5,0,2,7,0,0,7,2,"2",1.625,2 +"usbguard",-0.21450453,0.5691395227,-0.5636553493,"https://salsa.debian.org/birger/usbguard","https://github.com/dkopecek/usbguard",3141.3933796296,33,38,1,43,150,0,1,161,2,"2",1.53521126760563,1.93167701863354 +"usbmuxd",1.7018106669,3.399620343,0.8385492974,"https://salsa.debian.org/imobiledevice-team/usbmuxd","https://github.com/libimobiledevice/usbmuxd",5280.2443287037,27,16,0,24,138,0,1,149,4,"4",1.37209302325581,1.9261744966443 +"usbview",0.2830288966,1.2165170826,-0.0945146744,"https://salsa.debian.org/debian/usbview","https://github.com/gregkh/usbview.git",5596.9732407408,7,11,0,12,12,0,0,21,4,"4",1.61111111111111,1.57142857142857 +"uvloop",-0.4097803455,1.6193553491,-1.0751849943,"https://salsa.debian.org/python-team/packages/uvloop","https://github.com/MagicStack/uvloop",2912.1617939815,58,10,0,57,542,0,1,543,2,"2",1.14705882352941,1.99815837937385 +"v4l2loopback",-0.1197314674,0.4069152495,-0.2587985427,"https://salsa.debian.org/debian/v4l2loopback","https://github.com/umlaeute/v4l2loopback.git",5406.2159953704,26,63,0,57,94,0,35,176,4,"4",1.70786516853933,1.53409090909091 +"vagrant-libvirt",-0.1221442454,0.3185253091,-0.2416538921,"https://salsa.debian.org/ruby-team/vagrant-libvirt","https://github.com/vagrant-libvirt/vagrant-libvirt",3827.3451388889,87,210,0,209,98,0,3,280,3,"3",1.70707070707071,1.35 +"vagrant-lxc",0.8034556285,4.6021026989,-0.412211374,"https://salsa.debian.org/ruby-team/vagrant-lxc","https://github.com/fgrehm/vagrant-lxc",3559.775474537,9,55,2,46,129,0,31,186,2,"2",1.859375,1.69354838709677 +"vagrant-mutate",-0.4801401485,1.7149444538,-0.9074989115,"https://salsa.debian.org/ruby-team/vagrant-mutate","https://github.com/sciurus/vagrant-mutate",1407.9479166667,3,15,4,15,61,0,1,62,1,"1",1.83333333333333,1.98387096774194 +"vagrant-sshfs",-0.3177714786,2.0839099019,-0.8418425788,"https://salsa.debian.org/ruby-team/vagrant-sshfs","https://github.com/dustymabe/vagrant-sshfs",2305.1928472222,2,14,0,15,132,0,0,132,1,"1",1.875,2 +"vcsh",1.141131609,4.2673996711,0.0261319499,"https://github.com/RichiH/vcsh","https://github.com/RichiH/vcsh",4529.0101851852,11,57,0,53,153,63,2,223,3,"3",1.83823529411765,1.68609865470852 +"VOoM",-0.4785805602,0.6126802722,-0.659254773,"https://salsa.debian.org/yyabuki/vim-voom","https://github.com/vim-voom/VOoM.git",1193.9262731482,0,1,0,1,20,0,0,20,1,"1",2,2 +"virtualjaguar-debian",-0.3323824959,1.6186130413,-0.7674058951,"https://github.com/glaubitz/virtualjaguar-debian","https://github.com/glaubitz/virtualjaguar-debian",1293.0757291667,2,1,0,1,1,0,0,2,1,"1",1.33333333333333,1.5 +"vmtouch",0.0085288392,3.0675234726,-0.8067347383,"https://salsa.debian.org/debian/vmtouch","https://github.com/hoytech/vmtouch",4266.5434837963,8,25,0,21,85,0,0,86,3,"3",1.75757575757576,1.98837209302326 +"voctomix",-0.3727468412,1.1810950571,-0.6494603735,"https://salsa.debian.org/debian/voctomix","https://github.com/voc/voctomix.git",3329.1224189815,7,54,0,35,80,0,5,86,2,"2",1.88524590163934,1.93023255813953 +"voctomix-outcasts",-1.6893130475,-1.2420509413,-1.7699634447,"https://salsa.debian.org/debian/voctomix-outcasts","https://github.com/CarlFK/voctomix-outcasts.git",2648.5362847222,0,9,0,6,7,0,0,7,1,"1",2,2 +"vokoscreenNG",0.2104121096,1.2955691942,-0.1531712498,"https://salsa.debian.org/debian/vokoscreen-ng","https://github.com/vkohaupt/vokoscreenNG/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA +"volk",0.3490308455,1.9477412745,-0.157883478,"https://salsa.debian.org/bottoms/pkg-volk","https://github.com/gnuradio/volk",4752.915,39,93,0,74,106,0,0,129,3,"3",1.70454545454545,1.82170542635659 +"voltron",-1.8139477845,1.3185040904,-2.8023383764,"https://salsa.debian.org/python-team/packages/voltron","https://github.com/snare/voltron.git",2775.5086458333,5,31,0,19,212,0,1,213,2,"2",1.86111111111111,1.99530516431925 +"voluptuous",-0.403966828,1.2358837228,-0.7514608215,"https://salsa.debian.org/python-team/packages/voluptuous","https://github.com/alecthomas/voluptuous",4900.0540740741,38,69,0,73,81,0,0,132,3,"3",1.64485981308411,1.61363636363636 +"voms",-0.756674276,-0.2090198319,-0.9203293452,"https://salsa.debian.org/ellert/voms","https://github.com/italiangrid/voms",3745.5262731482,4,20,0,8,29,0,5,35,2,"2",1.83333333333333,1.82857142857143 +"waitress",-0.001435195,0.7796936159,-0.2577457307,"https://salsa.debian.org/python-team/packages/waitress","https://github.com/Pylons/waitress.git",4372.6596990741,10,50,0,48,135,0,0,153,3,"3",1.83333333333333,1.88235294117647 +"wal2json",-1.8275745539,0.5424600488,-2.3404171148,"https://salsa.debian.org/postgresql/wal2json","https://github.com/eulerto/wal2json.git",3393.2528703704,6,15,0,13,173,0,0,177,2,"2",1.71428571428571,1.9774011299435 +"wand",-0.67759885,-0.1056309981,-0.8962104321,"https://salsa.debian.org/debian/wand","https://github.com/emcconville/wand",4461.4997222222,24,94,1,85,430,0,0,439,3,"3",1.79661016949153,1.97949886104784 +"WavPack",0.5006437508,1.2816911597,0.1442013441,"https://salsa.debian.org/multimedia-team/wavpack","https://github.com/dbry/WavPack",5719.9072569445,11,19,0,26,86,0,0,87,4,"4",1.63333333333333,1.98850574712644 +"libwbxml",0.5716576747,2.0439677491,-0.0953236447,"https://salsa.debian.org/debian/wbxml2","https://github.com/libwbxml/libwbxml.git",5170.821412037,0,19,0,15,25,0,0,28,4,"4",2,1.89285714285714 +"wcwidth",0.3330909557,1.8989641963,-0.0738762364,"https://salsa.debian.org/python-team/packages/wcwidth","https://github.com/jquast/wcwidth",3540.9241550926,5,18,0,16,80,0,0,81,2,"2",1.78260869565217,1.98765432098765 +"websocketpp",-0.3732259601,1.2705562016,-0.7134226458,"https://salsa.debian.org/debian/websocketpp","https://github.com/zaphoyd/websocketpp.git",3911.9273263889,7,63,0,40,237,0,21,277,3,"3",1.9,1.85559566787004 +"websploit",-0.4221028192,2.1023366852,-1.0726176237,"https://salsa.debian.org/pkg-security-team/websploit","https://github.com/websploit/websploit",0.0014814815,1,1,0,1,3,0,0,4,1,"1",1.5,1.75 +"weevely3",-0.2507372174,2.1708290167,-0.8636427805,"https://salsa.debian.org/pkg-security-team/weevely","https://github.com/epinna/weevely3.git",3185.5150578704,7,21,0,18,24,0,3,39,2,"2",1.75,1.61538461538462 +"welle.io",-1.1503735792,0.8698707092,-1.5560375998,"https://salsa.debian.org/debian-hamradio-team/welle.io","https://github.com/AlbrechtL/welle.io",2902.9566203704,11,44,0,35,243,0,3,249,2,"2",1.8,1.97590361445783 +"weresync",0.8686224385,5.3149179418,-0.6110888212,"https://salsa.debian.org/python-team/packages/weresync","https://github.com/DonyorM/weresync.git",2224.0163194445,5,4,0,4,47,0,0,47,1,"1",1.44444444444444,2 +"weupnp",-1.9200689609,0.314231077,-2.3479232511,"https://salsa.debian.org/debian/weupnp","https://github.com/bitletorg/weupnp.git",896.40375,1,9,0,8,23,0,2,27,1,"1",1.9,1.85185185185185 +"wfmath",-0.3893875883,0.837955788,-0.9792345009,"https://salsa.debian.org/games-team/wfmath","https://github.com/worldforge/wfmath",5506.8696990741,0,8,0,7,8,0,0,9,4,"4",2,1.88888888888889 +"wfuzz",0.3494531903,3.0367255196,-0.346839296,"https://salsa.debian.org/pkg-security-team/wfuzz","https://github.com/xmendez/wfuzz.git",3000.7348148148,13,27,0,24,91,0,5,111,2,"2",1.675,1.81981981981982 +"whatthepatch",-1.2344880678,1.15651314,-1.8143537794,"https://salsa.debian.org/python-team/packages/whatthepatch","https://github.com/cscorley/whatthepatch",3792.0029513889,6,11,0,11,23,0,0,23,3,"3",1.64705882352941,2 +"when",-0.2471365546,1.4766184372,-0.8165939727,"https://salsa.debian.org/carnil/when","https://github.com/bcrowell/when/issues/new",2746.3319791667,2,17,0,0,0,0,0,0,2,"2",1.89473684210526,NA +"whichcraft",-0.303651311,1.9645474175,-0.7638381926,"https://salsa.debian.org/python-team/packages/whichcraft","https://github.com/cookiecutter/whichcraft",2896.9858101852,2,14,0,8,22,0,0,22,2,"2",1.875,2 +"wanderlust",-0.3325500668,0.46879212,-0.6623736703,"https://salsa.debian.org/debian/wl","https://github.com/wanderlust/wanderlust",5747.0710416667,6,25,0,16,85,0,0,85,4,"4",1.80645161290323,2 +"wanderlust",-0.9633885518,-0.6844818162,-1.0856880817,"https://salsa.debian.org/debian/wl-beta","https://github.com/wanderlust/wanderlust",5747.0710416667,6,25,0,16,85,0,0,85,4,"4",1.80645161290323,2 +"WPEBackend-fdo",0.5730095986,3.296980661,-0.0681747088,"https://salsa.debian.org/webkit-team/wpebackend-fdo","https://github.com/Igalia/WPEBackend-fdo",2058.3566319445,11,16,1,15,33,0,0,35,1,"1",1.59259259259259,1.94285714285714 +"Xastir",0.1089482482,0.8635088142,-0.3202862478,"https://salsa.debian.org/debian-hamradio-team/xastir","https://github.com/Xastir/Xastir.git",5658.7705902778,2,27,0,23,47,0,1,57,4,"4",1.93103448275862,1.82456140350877 +"xcape",0.1031866498,2.6635244357,-0.4881717246,"https://salsa.debian.org/debian/xcape","https://github.com/alols/xcape",2160.4542361111,3,26,0,19,215,0,0,216,1,"1",1.89655172413793,1.99537037037037 +"xcffib",0.3422766078,1.6439736239,-0.2089170835,"https://salsa.debian.org/python-team/packages/xcffib","https://github.com/tych0/xcffib.git",3466.6135069445,10,9,0,14,67,0,0,67,2,"2",1.47368421052632,2 +"xCHM",0.2106957608,0.7959718479,-0.0859691061,"https://salsa.debian.org/debian/xchm","https://github.com/rzvncj/xCHM.git",5664.2862037037,3,5,0,6,25,0,0,25,4,"4",1.625,2 +"xcscope.el",0.2222567121,2.7358133073,-0.5096652742,"https://salsa.debian.org/debian/xcscope-el","https://github.com/dkogan/xcscope.el",3521.9445949074,2,6,0,6,30,0,0,31,2,"2",1.75,1.96774193548387 +"xdffileio",-0.3370360933,3.1399742139,-1.5172901103,"https://salsa.debian.org/med-team/xdffileio","https://github.com/mmlabs-mindmaze/xdffileio.git",3980.6902777778,1,9,0,3,4,0,0,6,3,"3",1.9,1.66666666666667 +"xdms-debian",-0.3245085497,1.1111188277,-0.7327199722,"https://github.com/glaubitz/xdms-debian","https://github.com/glaubitz/xdms-debian",2621.1444212963,2,1,0,3,2,0,0,5,1,"1",1.33333333333333,1.4 +"xdotool",1.2968912917,2.6433354619,0.5854640504,"https://salsa.debian.org/debian/xdotool","https://github.com/jordansissel/xdotool.git",5532.0414351852,34,28,0,50,581,0,0,582,4,"4",1.45161290322581,1.99828178694158 +"xen-tools",0.1849226805,0.4044499915,0.02937965,"https://github.com/xen-tools/xen-tools","https://github.com/xen-tools/xen-tools",5773.4961921296,25,18,2,29,33,0,0,52,4,"4",1.41860465116279,1.63461538461538 +"xmldiff",0.559598996,1.5801414897,0.007932953,"https://salsa.debian.org/debian/xmldiff","https://github.com/Shoobx/xmldiff.git",5659.7240162037,11,15,0,19,92,0,0,95,4,"4",1.57692307692308,1.96842105263158 +"xmltv",-0.0141973655,0.1968271173,-0.1465991903,"https://salsa.debian.org/nickm/xmltv","https://github.com/XMLTV/xmltv.git",5729.3252314815,14,54,0,44,137,0,0,159,4,"4",1.79411764705882,1.86163522012579 +"xmoto",-0.0128577775,0.350476721,-0.2212793709,"https://salsa.debian.org/games-team/xmoto","https://github.com/xmoto/xmoto",5752.6098148148,7,30,1,14,32,0,1,34,4,"4",1.81081081081081,1.94117647058824 +"yadm",0.155795293,2.4789916734,-0.5346609613,"https://salsa.debian.org/debian/yadm","https://github.com/TheLocehiliosan/yadm",1719.5473611111,26,32,0,34,348,0,0,348,1,"1",1.55172413793103,2 +"yanc",-1.5009992611,1.4616219544,-2.2668515294,"https://salsa.debian.org/python-team/packages/yanc","https://github.com/0compute/yanc",1361.9793865741,0,3,0,2,13,0,0,13,1,"1",2,2 +"yatm",-0.9969942564,0.469884003,-1.3959449427,"https://salsa.debian.org/debian/yatm","https://github.com/mlang/yatm.git",2272.488912037,0,3,0,1,4,0,0,5,1,"1",2,1.8 +"yder",-0.5735586705,1.4948558419,-1.0176765614,"https://salsa.debian.org/debian-iot-team/oauth2/yder.git","https://github.com/babelouest/yder",1282.873275463,2,11,0,9,16,0,0,16,1,"1",1.84615384615385,2 +"ydpdict",-1.6620122332,-0.9650225761,-1.8878460738,"https://github.com/porridge/ydpdict","https://github.com/porridge/ydpdict",5724.9537731482,0,4,0,3,0,0,0,3,4,"4",2,1