├── AutoMR.R ├── AutoMR_scheme.png ├── README.md └── ex ├── command └── output ├── Anhedonia _mrplot.pdf ├── Anhedonia_all_mr_res.tsv ├── Anhedonia_all_mr_res_signif.tsv ├── Anhedonia_target_GWAS_subcategories.csv ├── Anhedonia_twosample_forward.rds └── Anhedonia_twosample_forward_signif.rds /AutoMR.R: -------------------------------------------------------------------------------- 1 | suppressMessages(library(tidyverse)) 2 | suppressMessages(library(dplyr)) 3 | suppressMessages(library(TwoSampleMR)) 4 | suppressMessages(library(readr)) 5 | suppressMessages(library(igraph)) 6 | suppressMessages(library(ggsci)) 7 | suppressMessages(library(NetPathMiner)) 8 | suppressMessages(library(optparse)) 9 | 10 | #----FUNCTIONALITY---- 11 | #Adds rsid to summary statistics if a mapping file with chromosomal positions is supplied 12 | #Performs bulk MR analysis in both directions with specific summary statistics from TwoSampleMR package or with summary statistics for phenotypes containing specific substrings in their names 13 | 14 | #-----FUNCTIONS------ 15 | calculate_se_frombeta<-function(dfpath, betacol, tstatcol, savepath, sep='\t'){ #also works for logOR 16 | df<-read_delim(dfpath, delim=sep) 17 | df$se_calc<-unlist(df[betacol]/df[tstatcol]) 18 | df %>% 19 | write_delim(savepath, delim=sep) 20 | } 21 | 22 | unify_sumstat_colnames<-function(sumstat, outcomename=gwasname,rsid_coln=rsid_col, effect_coln=effect_col, se_coln=se_col, pval_coln=pval_col, effect_allele_coln=effect_allele_col, other_allele_coln=other_allele_col, n=npersons){ 23 | print('Unifying summary statistic column names...') 24 | sumstat$rsid=unlist(sumstat[rsid_coln]) 25 | sumstat$effect=unlist(sumstat[effect_coln]) 26 | sumstat$se=unlist(sumstat[se_coln]) 27 | sumstat$pval=unlist(sumstat[pval_coln]) 28 | sumstat$A1=unlist(sumstat[effect_allele_coln]) 29 | sumstat$A2=unlist(sumstat[other_allele_coln]) 30 | sumstat %>% 31 | mutate(npersons=n, phenotype=gwasname) %>% 32 | dplyr::select(rsid, effect, se, pval, A1, A2, npersons, phenotype) 33 | } 34 | 35 | two_sample_mr.backward.singular<-function(outcome_sumstat=processed_sumstat_name, exposure_id, exposure_name, exposure_threshold_p=MR.BACKWARD.THRESHOLD_PVAL, eval_singlesnp=TRUE, onlysum=MR.SAVE_ONLYSUMMARY){ 36 | print(paste('Exposure:',exposure_name)) 37 | 38 | proceed=FALSE 39 | tryCatch({ 40 | instruments<-extract_instruments(exposure_id, p1=exposure_threshold_p) 41 | outcomes<- read_outcome_data( 42 | snps = instruments$SNP, 43 | filename = processed_sumstat_name, 44 | sep = "\t", 45 | snp_col = "rsid", 46 | beta_col = "effect", 47 | se_col = "se", 48 | effect_allele_col = "A1", 49 | other_allele_col = "A2", 50 | pval_col = "pval", 51 | samplesize_col = "npersons", 52 | phenotype_col='phenotype' 53 | ) 54 | proceed=TRUE 55 | }, error = function(e){ 56 | print('Network error...') 57 | } 58 | ) 59 | 60 | if (proceed==TRUE){ 61 | result<-list() 62 | tryCatch({ 63 | dat <- harmonise_data(instruments, outcomes) 64 | res <- generate_odds_ratios(mr(dat)) 65 | 66 | 67 | if (onlysum==FALSE){ 68 | scatter<-mr_scatter_plot(res, dat) 69 | pleiotropy_test<-mr_pleiotropy_test(dat) 70 | pleiotropy_test_p=pleiotropy_test$pval 71 | heterogeneity_test<-mr_heterogeneity(dat) 72 | directionality_testres<-directionality_test(dat) 73 | 74 | res<-res %>% 75 | mutate(exposure.pipename=exposure_name, exposure_threshold_pval=exposure_threshold_p, pleiotropy_test_pval=pleiotropy_test_p, directionality_test_pval=directionality_testres$steiger_pval) 76 | res<-left_join(res, heterogeneity_test) 77 | result$scatter<-list(scatter) 78 | result$pleiotropy_test<-pleiotropy_test 79 | result$directionality_test<-directionality_testres 80 | result$res<-res 81 | 82 | } else{ 83 | res<-res %>% 84 | mutate(exposure.pipename=exposure_name, exposure_threshold_pval=exposure_threshold_p) 85 | eval_singlesnp=FALSE 86 | 87 | } 88 | 89 | result$dat<-dat 90 | result$res<-res 91 | 92 | if (eval_singlesnp==TRUE){ 93 | res_single <- mr_singlesnp(dat) 94 | res_single_forestplot<- mr_forest_plot(res_single) 95 | result$single_res<-res_single 96 | result$single_forest<-list(res_single_forestplot) 97 | } 98 | 99 | }, error = function(e){ 100 | print('Not enough SNPs...') 101 | } 102 | ) 103 | 104 | if (length(result)==0){ 105 | 'Undefined' 106 | } else { 107 | result 108 | } 109 | } else { 110 | 'Undefined' 111 | } 112 | } 113 | 114 | two_sample_mr.forward.singular<-function(exposure_sumstat=processed_sumstat_name, exposure_sumstat_mode='obj', outcome_id, outcome_name, exposure_threshold_p=MR.FORWARD.THRESHOLD_PVAL, eval_singlesnp=TRUE, onlysum=MR.SAVE_ONLYSUMMARY){ 115 | if (!exposure_sumstat_mode=='obj'){ 116 | instruments<-read_exposure_data(filename=exposure_sumstat, 117 | sep='\t', 118 | snp_col = 'rsid', 119 | beta_col = "effect", 120 | se_col='se', 121 | effect_allele_col='A1', 122 | pval_col = 'pval', 123 | samplesize_col = 'npersons', 124 | other_allele_col = 'A2') 125 | 126 | instruments<-instruments %>% 127 | filter(pval.exposure% 146 | mutate(outcome.pipename=outcome_name, exposure_threshold_pval=exposure_threshold_p, pleiotropy_test_pval=pleiotropy_test_p, directionality_test_pval=directionality_testres$steiger_pval) 147 | res<-left_join(res, heterogeneity_test) 148 | result$res<-res 149 | result$scatter<-list(scatter) 150 | result$pleiotropy_test<-pleiotropy_test 151 | result$directionality_test<-directionality_testres 152 | 153 | } else { 154 | res<-res %>% 155 | mutate(outcome.pipename=outcome_name, exposure_threshold_pval=exposure_threshold_p) 156 | eval_singlesnp=FALSE 157 | } 158 | 159 | result$dat<-dat 160 | result$res<-res 161 | 162 | 163 | if (eval_singlesnp==TRUE){ 164 | res_single <- mr_singlesnp(dat) 165 | res_single_forestplot<- mr_forest_plot(res_single) 166 | result$single_res<-res_single 167 | result$single_forest<-list(res_single_forestplot) 168 | } 169 | 170 | }, error = function(e){ 171 | print('Not enouht SNPs...') 172 | } 173 | ) 174 | 175 | if (length(result)==0){ 176 | 'Undefined' 177 | } else { 178 | result 179 | } 180 | } 181 | 182 | 183 | 184 | two_sample_mr.backward.serial<-function(outcome_sumstat=processed_sumstat_name, exposure_ids=MR.COMPARISON_STUDIES, exposure_names=MR.COMPARISON_STUDIES.NAMES, exposure_threshold_p=MR.BACKWARD.THRESHOLD_PVAL, eval_singlesnp=TRUE, onlysum=MR.SAVE_ONLYSUMMARY){ 185 | print('Starting MR evaluation...') 186 | allres<-list() 187 | result_fulldf<-tibble() 188 | print('Starting two sample MR experiment series...') 189 | total_nsstats=length(exposure_ids) 190 | for (i in c(1:length(exposure_ids))){ 191 | if (i%%10==0){ 192 | print(paste((i/total_nsstats)*100, '% complete...', sep='')) 193 | } 194 | exposure_id=exposure_ids[i] 195 | exposure_name<-exposure_names[i] 196 | cur_result<-two_sample_mr.backward.singular(exposure_id=exposure_id, exposure_name=exposure_name, exposure_threshold_p = exposure_threshold_p, eval_singlesnp = eval_singlesnp, onlysum=onlysum) 197 | if (!cur_result=='Undefined'){ 198 | cur_result_df=cur_result$res 199 | if (length(allres)==0){ 200 | result_fulldf = cur_result_df 201 | } else { 202 | result_fulldf = rbind(result_fulldf, cur_result_df) 203 | } 204 | allres[exposure_id]=list(cur_result) 205 | } 206 | } 207 | allres$full_dataframe=result_fulldf 208 | allres 209 | } 210 | 211 | 212 | 213 | 214 | two_sample_mr.forward.serial<-function(exposure_sumstat=processed_sumstat_name, outcome_ids=MR.COMPARISON_STUDIES, outcome_names=MR.COMPARISON_STUDIES.NAMES, exposure_threshold_p=MR.FORWARD.THRESHOLD_PVAL, eval_singlesnp=TRUE, onlysum=MR.SAVE_ONLYSUMMARY){ 215 | print('Starting MR evaluation...') 216 | allres<-list() 217 | result_fulldf<-tibble() 218 | print('Starting two sample MR experiment series...') 219 | total_nsstats=length(outcome_ids) 220 | instruments<-read_exposure_data(filename=exposure_sumstat, 221 | sep='\t', 222 | snp_col = 'rsid', 223 | beta_col = "effect", 224 | se_col='se', 225 | effect_allele_col='A1', 226 | pval_col = 'pval', 227 | samplesize_col = 'npersons', 228 | other_allele_col = 'A2') 229 | 230 | instruments<-instruments %>% 231 | filter(pval.exposure% 377 | write_csv(paste(gwasname, 'target_GWAS_subcategories.csv', sep='')) 378 | 379 | 380 | MR.COMPARISON_STUDIES.RUN_SPECIFIC=strsplit(opt$specific_studies, split=',', fixed=TRUE)[[1]] #indexes of studies from ao 381 | MR.PHENONAMES.NCASE_THRESHOLD=opt$comparison_study_n_cases_threshold 382 | MR.FORWARD.THRESHOLD_PVALS=as.numeric(strsplit(opt$forward_pvals, split=',', fixed=TRUE)[[1]])#threshold p-value for instrument extraction from the studied sumstat. 383 | MR.BACKWARD.THRESHOLD_PVALS=as.numeric(strsplit(opt$backward_pvals, split=',', fixed=TRUE)[[1]]) 384 | MR.VISUALIZE=opt$visualize 385 | 386 | #---***---- 387 | #-----RUN----- 388 | #----1. Preprocessing---- 389 | if (!file.exists(processed_sumstat_name)){ 390 | gwas<-read_tsv(gwas_sumstatfile_path) 391 | # if (!'rsid' %in% colnames(gwas)){ 392 | # print('Annotating the summary statistics...') 393 | # annotation<-read_tsv(annotationfile_path) 394 | # gwas$CHR=unlist(gwas[chr_col]) 395 | # gwas$POS=unlist(gwas[pos_col]) 396 | # gwas<-left_join(gwas, annotation) 397 | # print('Count of unmapped rsids:') 398 | # print(sum(is.na(gwas$rsid))) 399 | # } else { 400 | # print('Using rs IDs from the summary statistics...') 401 | # } 402 | 403 | if ((!log_or_col %in% colnames(gwas)) & (effect_col=='LOG_OR')){ 404 | print('Calculating log(OR)...') 405 | gwas$LOG_OR=log(unlist(gwas[or_col])) 406 | } 407 | 408 | if ((log_or_col %in% colnames(gwas)) & (effect_col=='LOG_OR')){ 409 | gwas$LOG_OR=log(unlist(gwas[log_or_col])) 410 | } 411 | 412 | if (!other_allele_col %in% colnames(gwas)){ 413 | print('Getting the other allele...') 414 | gwas$A1=gwas[effect_allele_col] 415 | gwas<-gwas %>% 416 | mutate(A2=ifelse(A1==REF, ALT, REF)) 417 | } 418 | 419 | if (!se_col %in% colnames(gwas)){ 420 | print('Calculating SE...') 421 | gwas[se_col]<-unlist(gwas[effect_col]/gwas[stat_column]) 422 | } 423 | 424 | gwas<-unify_sumstat_colnames(gwas) 425 | gwas %>% 426 | write_tsv(processed_sumstat_name) 427 | } 428 | 429 | #----***---- 430 | #----2. Mendelian randomization (two sample) run---- 431 | #----2.1 Selection of comparison studies---- 432 | MR.COMPARISON_STUDIES<-c() 433 | for (substring in MR.COMPARISON_STUDIES.RUN_PHENONAMES){ 434 | MR.COMPARISON_STUDIES_PT=ao %>% 435 | filter(grepl(substring, trait, ignore.case = TRUE)) %>% 436 | filter(ncase>MR.PHENONAMES.NCASE_THRESHOLD) %>% 437 | select(id) %>% 438 | pull() 439 | MR.COMPARISON_STUDIES=c(MR.COMPARISON_STUDIES, MR.COMPARISON_STUDIES_PT) 440 | } 441 | for (subcat in MR.COMPARISON_STUDIES.RUN_SUBCATEGORIES){ 442 | MR.COMPARISON_STUDIES_PT=ao %>% 443 | filter(subcategory==subcat) %>% 444 | filter(ncase>MR.PHENONAMES.NCASE_THRESHOLD) %>% 445 | select(id) %>% 446 | pull() 447 | MR.COMPARISON_STUDIES=c(MR.COMPARISON_STUDIES, MR.COMPARISON_STUDIES_PT) 448 | } 449 | MR.COMPARISON_STUDIES=c(MR.COMPARISON_STUDIES, MR.COMPARISON_STUDIES.RUN_SPECIFIC) 450 | MR.COMPARISON_STUDIES=unique(MR.COMPARISON_STUDIES) 451 | MR.COMPARISON_STUDIES.NAMES=rep('default', length(MR.COMPARISON_STUDIES)) 452 | print('Count of comparison GWAS studies:') 453 | print(length(MR.COMPARISON_STUDIES.NAMES)) 454 | 455 | 456 | 457 | #----2.2 MR run in backward direction----- 458 | if (MR.BACKWARD==TRUE){ 459 | if (!file.exists(mr_ts_backward_resname)){ 460 | print('Performing two sample MR analysis in backward direction (comparison phenotypes->target summary statistic)') 461 | allres<-list() 462 | allresdf<-'Undefined' 463 | total_nsstats=length(MR.BACKWARD.THRESHOLD_PVALS) 464 | for (ind in c(1:length(MR.BACKWARD.THRESHOLD_PVALS))){ 465 | 466 | MR.BACKWARD.THRESHOLD_PVAL=MR.BACKWARD.THRESHOLD_PVALS[ind] 467 | print(paste('Exposure p-value:', MR.BACKWARD.THRESHOLD_PVAL)) 468 | sectionname<-paste('exposure_p_threshold', MR.BACKWARD.THRESHOLD_PVAL, sep='_') 469 | mr_results<-two_sample_mr.backward.serial(outcome_sumstat=processed_sumstat_name, exposure_ids=MR.COMPARISON_STUDIES, exposure_names=MR.COMPARISON_STUDIES.NAMES, exposure_threshold_p=MR.BACKWARD.THRESHOLD_PVAL, eval_singlesnp=FALSE, onlysum=MR.SAVE_ONLYSUMMARY) 470 | if (length(allres)==0){ 471 | allresdf=mr_results$full_dataframe 472 | } else { 473 | allresdf<-rbind(allresdf, mr_results$full_dataframe) 474 | } 475 | if (MR.SAVE_ONLYSUMMARY==FALSE){ 476 | allres[sectionname]<-list(mr_results) 477 | } 478 | } 479 | allres$resdf<-list(allresdf) 480 | print('Significant interactions:') 481 | print(allres$resdf[[1]]%>% 482 | filter(pval<0.05) %>% 483 | filter(method=='Inverse variance weighted')) 484 | saveRDS(allres, file=mr_ts_backward_resname) 485 | } 486 | } 487 | 488 | 489 | #-----2.3 MR run in foreward direction----- 490 | if (MR.FORWARD==TRUE){ 491 | if (!file.exists(mr_ts_forward_resname)){ 492 | print('Performing two sample MR analysis in backward direction (comparison phenotypes->target summary statistic)') 493 | allres<-list() 494 | allresdf<-'Undefined' 495 | total_nsstats=length(MR.FORWARD.THRESHOLD_PVALS) 496 | for (ind in c(1:length(MR.FORWARD.THRESHOLD_PVALS))){ 497 | 498 | MR.FORWARD.THRESHOLD_PVAL=MR.FORWARD.THRESHOLD_PVALS[ind] 499 | print(paste('Exposure p-value:', MR.FORWARD.THRESHOLD_PVAL)) 500 | sectionname<-paste('exposure_p_threshold', MR.FORWARD.THRESHOLD_PVAL, sep='_') 501 | mr_results<-two_sample_mr.forward.serial(exposure_sumstat=processed_sumstat_name, outcome_ids=MR.COMPARISON_STUDIES, outcome_names=MR.COMPARISON_STUDIES.NAMES, exposure_threshold_p=MR.FORWARD.THRESHOLD_PVAL, eval_singlesnp=FALSE) 502 | if (length(allres)==0){ 503 | allresdf=mr_results$full_dataframe 504 | } else { 505 | allresdf<-rbind(allresdf, mr_results$full_dataframe) 506 | } 507 | if (MR.SAVE_ONLYSUMMARY==FALSE){ 508 | allres[sectionname]<-list(mr_results) 509 | } 510 | } 511 | allres$resdf<-list(allresdf) 512 | print('Significant interactions:') 513 | print(allres$resdf[[1]]%>% 514 | filter(pval<0.05) %>% 515 | filter(method=='Inverse variance weighted')) 516 | saveRDS(allres, file=mr_ts_forward_resname) 517 | } 518 | } 519 | 520 | 521 | 522 | #----2.4 Saving nominally significant results---- 523 | if (MR.BACKWARD==TRUE){ 524 | if (!file.exists(mr_ts_backward_signif_resname)){ 525 | print('Gathering data for significant MR hits in backward direction...') 526 | bckwd<-readRDS(mr_ts_backward_resname) 527 | significant_expids<-bckwd$resdf[[1]] %>% 528 | filter(pval% 529 | filter(method=='Inverse variance weighted') %>% 530 | select(id.exposure, exposure_threshold_pval) 531 | pvals<-significant_expids$exposure_threshold_pval 532 | significant_expids<-significant_expids$id.exposure 533 | bckwd_signif_res<-list() 534 | for (i in c(1:length(significant_expids))){ 535 | expid=significant_expids[i] 536 | threshp=pvals[i] 537 | cur_result<-two_sample_mr.backward.singular(outcome_sumstat = processed_sumstat_name, exposure_id = expid, exposure_name = 'default', exposure_threshold_p = threshp, eval_singlesnp = TRUE,onlysum = FALSE) 538 | bckwd_signif_res[expid]<-list(cur_result) 539 | } 540 | bckwd_signif_res$resdf<-bckwd$resdf[[1]] 541 | saveRDS(bckwd_signif_res, file=mr_ts_backward_signif_resname) 542 | } 543 | } 544 | 545 | 546 | 547 | if (MR.FORWARD==TRUE){ 548 | if (!file.exists(mr_ts_forward_signif_resname)){ 549 | print('Gathering data for significant MR hits in forward direction...') 550 | fwd<-readRDS(mr_ts_forward_resname) 551 | significant_outids<-fwd$resdf[[1]] %>% 552 | filter(pval% 553 | filter(method=='Inverse variance weighted') %>% 554 | select(id.outcome, exposure_threshold_pval) 555 | pvals<-significant_outids$exposure_threshold_pval 556 | significant_outids<-significant_outids$id.outcome 557 | fwd_signif_res<-list() 558 | for (i in c(1:length(significant_outids))){ 559 | outid=significant_outids[i] 560 | threshp=pvals[i] 561 | cur_result<-two_sample_mr.forward.singular(exposure_sumstat = processed_sumstat_name, exposure_sumstat_mode = 'path',outcome_id = outid,outcome_name = 'default', exposure_threshold_p = threshp, eval_singlesnp = TRUE, onlysum = FALSE) 562 | fwd_signif_res[outid]<-list(cur_result) 563 | } 564 | fwd_signif_res$resdf<-fwd$resdf[[1]] 565 | saveRDS(bckwd_signif_res, file=mr_ts_forward_signif_resname) 566 | } 567 | } 568 | 569 | 570 | #----2.5 Saving resulting dataframes----- 571 | if (!file.exists(mr_ts_resdfname)){ 572 | print('Saving MR results...') 573 | if (MR.FORWARD==TRUE && MR.BACKWARD==TRUE){ 574 | bckwd<-readRDS(mr_ts_backward_resname)$resdf[[1]] 575 | fwd<-readRDS(mr_ts_forward_resname)$resdf[[1]] 576 | all_results<-full_join(bckwd, fwd) 577 | all_results$exposure<-gsub('exposure', gwasname, all_results$exposure) 578 | 579 | all_results %>% 580 | write_tsv(mr_ts_resdfname) 581 | } 582 | if (MR.FORWARD==TRUE && MR.BACKWARD==FALSE){ 583 | fwd<-readRDS(mr_ts_forward_resname)$resdf[[1]] 584 | fwd$exposure<-gsub('exposure', gwasname, fwd$exposure) 585 | fwd %>% 586 | write_tsv(mr_ts_resdfname) 587 | } 588 | if (MR.FORWARD==FALSE && MR.BACKWARD==TRUE){ 589 | bckwd<-readRDS(mr_ts_backward_resname)$resdf[[1]] 590 | bckwd %>% 591 | write_tsv(mr_ts_resdfname) 592 | } 593 | } 594 | 595 | if (!file.exists(mr_ts_signif_resdfname)){ 596 | print('Saving significant MR results...') 597 | mrres<-read_tsv(mr_ts_resdfname) 598 | mrres_signif<-mrres %>% 599 | filter(pval% 600 | filter(method=='Inverse variance weighted') 601 | mrres_signif %>% 602 | write_tsv(mr_ts_signif_resdfname) 603 | } 604 | 605 | 606 | #-----***----- 607 | #-----3. Visualization of MR results----- 608 | if (MR.VISUALIZE==TRUE){ 609 | if (!file.exists(mr_ts_graphdata)){ 610 | print('Plotting the results...') 611 | mrres<-read_tsv(mr_ts_resdfname) 612 | mrres_signif<-read_tsv(mr_ts_signif_resdfname) 613 | 614 | nodes<-c() 615 | nodes<-c(nodes, mrres_signif$exposure) 616 | nodes<-c(nodes, mrres_signif$outcome) 617 | nodes<-unique(nodes) 618 | other_nodes=nodes[nodes!=gwasname] 619 | 620 | mr_data_forvis<-mrres %>% 621 | filter(method=='Inverse variance weighted') %>% 622 | filter((exposure %in% other_nodes) | (outcome %in% other_nodes)) 623 | mr_data_forvis<-mr_data_forvis %>% 624 | mutate(is_significant_interaction=as.numeric(pval% 625 | mutate(neglgp=-log10(pval)) %>% 626 | mutate(increase=as.numeric(or>1)+1) 627 | mr_data_forvis_graph<-mr_data_forvis %>% 628 | select(-c(id.exposure, id.outcome, method, exposure.pipename, outcome.pipename)) %>% 629 | mutate(color_code=increase*is_significant_interaction) 630 | 631 | ao_ann<-available_outcomes() 632 | ao_ann<-ao_ann%>% 633 | mutate(vertex=paste(trait, '||', paste('id:',id, sep=''))) 634 | 635 | nodedata<-tibble(vertex=nodes) 636 | nodedata<-left_join(nodedata, ao_ann) 637 | nodedata$subcategory[is.na(nodedata$subcategory)]<-'Target' 638 | nodedata$trait[is.na(nodedata$trait)]<-gwasname 639 | nodedata$subcategory[nodedata$subcategory=='NA']<-'Other' 640 | nodedata$id[nodedata$vertex==gwasname]<-gwassource 641 | 642 | #----->Manual subcategory setting---- 643 | #Here subcategories can be written manually 644 | #nodedata$subcategory<-c('Psychiatric / Neurological', 'Psychiatric / Neurological', 'Diabetes','Diabetes','Personality','Target','Psychiatric / Neurological','Psychiatric / Neurological', 'Psychiatric / Neurological','Psychiatric / Neurological','Psychiatric / Neurological','Psychiatric / Neurological','Lipids','Lipids','Lipids','Respiratory system', 'Respiratory system','Psychiatric / Neurological','Psychiatric / Neurological','Inflammatory GI diseases','Inflammatory GI diseases','Inflammatory GI diseases', 'Cancer','Cancer','Cancer') 645 | mr_data_forvis_graph <- mr_data_forvis_graph[, c("exposure", "outcome", colnames(mr_data_forvis_graph)[c(3:length(colnames(mr_data_forvis_graph)))])] 646 | 647 | 648 | g = graph_from_data_frame(mr_data_forvis_graph, directed = TRUE, vertices = nodedata) 649 | vertex_groups<-V(g)[c(1:length(V(g)))]$subcategory 650 | vertex_groups<-factor(vertex_groups) 651 | vertex_groups_numeric<-unclass(vertex_groups) 652 | 653 | 654 | node_colors<-pal_aaas(palette = c("default"))(max(vertex_groups_numeric)) 655 | edge_colors<-c('slategray','midnightblue','darkorchid')[E(g)$color_code+1] 656 | V(g)$labels<-paste(paste(V(g)$trait, sep=''),'\n', V(g)$id) 657 | V(g)$size<-as.numeric(V(g)$name==gwasname)*15+5 658 | g<-setAttribute(g, 'subcategory', V(g)$subcategory) 659 | l = layoutVertexByAttr(g, "subcategory", cluster.strength=7) 660 | 661 | 662 | 663 | pdf(file=paste(gwasname,"_mrplot.pdf")) 664 | plot(g,vertex.size=V(g)$size, 665 | vertex.label=V(g)$labels, 666 | vertex.frame.color = "white", 667 | vertex.label.dist=1.2, 668 | vertex.label.color='gray10', 669 | vertex.color=adjustcolor(node_colors[vertex_groups_numeric], alpha.f = .9), 670 | vertex.label.family="Helvetica", 671 | vertex.label.cex=0.5, 672 | edge.curved=TRUE, 673 | edge.curved=0.05, 674 | edge.arrow.size=1, 675 | edge.arrow.width=0.6, 676 | edge.color=adjustcolor(edge_colors, alpha.f=.7), 677 | edge.width=as.integer(cut(abs(E(g)$neglgp), breaks = 5))*1.3, 678 | ylim=c(-1,1),xlim=c(-1,1.2), asp = .8, 679 | layout=l) 680 | dev.off() 681 | 682 | } 683 | } 684 | 685 | -------------------------------------------------------------------------------- /AutoMR_scheme.png: -------------------------------------------------------------------------------- https://raw.githubusercontent.com/ACDBio/AutoMR/b1f45c040b986488ff2a597bd2fac1bd4f564c62/AutoMR_scheme.png -------------------------------------------------------------------------------- /README.md: -------------------------------------------------------------------------------- 1 | # AutoMR 2 | ![Project Image](https://github.com/ACDBio/AutoMR/blob/main/AutoMR_scheme.png) 3 | > A script to run two-sample Mendelian Randomization (MR) in predefined directions using IEU GWAS data with provided in-house summary statistic in an automated manner. 4 | 5 | ### Examples 6 | - to run MR to assess the effect of the summary statistic of interest (./ex/GWAS_example.tsv) on a range of IEU phenotypes with count of cases>4000): 7 | ```shell 8 | Rscript AutoMR.R -i './ex/GWAS_example.tsv' -r 'rsid' -e 'LOG_OR' -o 'OR' -s 'LOG(OR)_SE' -p 'P' --effect_allele_column 'ALT' --other_allele_column 'REF' -n 4520 -f TRUE -b FALSE --grep_phenotypes 'depress,bipol' --grep_subcategories 'Psychiatric / neurological' --specific_studies 'ieu-b-5075' -d 4000 --forward_pvals 5e-5 --visualize TRUE -x 'Anhedonia,current study' 9 | ``` 10 | -------------------------------------------------------------------------------- /ex/command: -------------------------------------------------------------------------------- 1 | Rscript AutoMR.R -i './ex/anhedonia_preprocessed.tsv' -r 'rsid' -e 'effect' -o 'OR' -s 'se' -p 'pval' --effect_allele_column 'A1' --other_allele_column 'A2' -n 4520 -f TRUE -b FALSE --grep_phenotypes 'depress,bipol' --grep_subcategories 'Psychiatric / neurological' --specific_studies 'ieu-b-5075' -d 4000 --forward_pvals 5e-5 --visualize TRUE -x 'Anhedonia,current study' 2 | -------------------------------------------------------------------------------- /ex/output/Anhedonia _mrplot.pdf: -------------------------------------------------------------------------------- https://raw.githubusercontent.com/ACDBio/AutoMR/b1f45c040b986488ff2a597bd2fac1bd4f564c62/ex/output/Anhedonia _mrplot.pdf -------------------------------------------------------------------------------- /ex/output/Anhedonia_all_mr_res.tsv: -------------------------------------------------------------------------------- 1 | id.exposure id.outcome outcome exposure method nsnp b se pval lo_ci up_ci or or_lci95 or_uci95 outcome.pipename exposure_threshold_pval 2 | yLwDJh finn-b-O15_POSTPART_DEPR Postpartum depression || id:finn-b-O15_POSTPART_DEPR Anhedonia MR Egger 50 0.06089043709426403 0.04062063537209095 0.14042161365654662 -0.01872600823503423 0.1405068824235623 1.0627824662729557 0.9814482341406757 1.1508570002229261 default 5e-5 3 | yLwDJh finn-b-O15_POSTPART_DEPR Postpartum depression || id:finn-b-O15_POSTPART_DEPR Anhedonia Weighted median 50 -0.011817548172900684 0.019974010249005913 0.5540874993359346 -0.05096660826095227 0.027331511915150902 0.9882520047980438 0.9503104025196062 1.0277084438915245 default 5e-5 4 | yLwDJh finn-b-O15_POSTPART_DEPR Postpartum depression || id:finn-b-O15_POSTPART_DEPR Anhedonia Inverse variance weighted 50 -0.004357080614184586 0.01523467347878687 0.7748799314635448 -0.03421704063260685 0.025502879404237677 0.9956523976906451 0.9663617421109996 1.0258308600479176 default 5e-5 5 | yLwDJh finn-b-O15_POSTPART_DEPR Postpartum depression || id:finn-b-O15_POSTPART_DEPR Anhedonia Simple mode 50 -0.030033601031591195 0.04732130330543551 0.5285934493713393 -0.1227833555102448 0.06271615344706241 0.9704129261253025 0.8844552541636885 1.0647245779341468 default 5e-5 6 | yLwDJh finn-b-O15_POSTPART_DEPR Postpartum depression || id:finn-b-O15_POSTPART_DEPR Anhedonia Weighted mode 50 -0.03507608518524963 0.0466177006822177 0.4553981019825879 -0.12644677852239633 0.05629460815189706 0.965531950785445 0.8812210481817767 1.0579093065367222 default 5e-5 7 | yLwDJh ebi-a-GCST90016622 Schizophrenia vs major depressive disorder (ordinary least squares (OLS)) || id:ebi-a-GCST90016622 Anhedonia MR Egger 31 -7.344736021687578e-4 0.004075229168542988 0.8582264989713508 -0.008721922772513015 0.007252975568175499 0.9992657960575441 0.9913160028543546 1.0072793421022004 default 5e-5 8 | yLwDJh ebi-a-GCST90016622 Schizophrenia vs major depressive disorder (ordinary least squares (OLS)) || id:ebi-a-GCST90016622 Anhedonia Weighted median 31 0.0016735437467672377 0.001980023244834839 0.3979912599706864 -0.002207301813109047 0.005554389306643522 1.0016749449026263 0.9977951324861309 1.0055698435265976 default 5e-5 9 | yLwDJh ebi-a-GCST90016622 Schizophrenia vs major depressive disorder (ordinary least squares (OLS)) || id:ebi-a-GCST90016622 Anhedonia Inverse variance weighted 31 8.714760822197586e-4 0.001628059498462783 0.5924526894320513 -0.002319520534767296 0.004062472699206813 1.000871855927835 0.9976831674742892 1.0040707357270753 default 5e-5 10 | yLwDJh ebi-a-GCST90016622 Schizophrenia vs major depressive disorder (ordinary least squares (OLS)) || id:ebi-a-GCST90016622 Anhedonia Simple mode 31 0.001130327843871938 0.0034117891965173603 0.7427206235879378 -0.005556778981302088 0.007817434669045964 1.0011309669051496 0.9944586313578591 1.007848070590854 default 5e-5 11 | yLwDJh ebi-a-GCST90016622 Schizophrenia vs major depressive disorder (ordinary least squares (OLS)) || id:ebi-a-GCST90016622 Anhedonia Weighted mode 31 0.0016790139496894244 0.002219246035185043 0.45520859687859627 -0.00267070827927326 0.0060287361786521085 1.0016804242828237 0.9973328548893161 1.0060469455834489 default 5e-5 12 | yLwDJh ukb-d-20450 Feelings of worthlessness during worst period of depression || id:ukb-d-20450 Anhedonia MR Egger 53 0.004604721484298163 0.00672707707504095 0.49675501259009125 -0.008580349582782098 0.017789792551378424 1.0046153395056934 0.9914563565578363 1.0179489734415408 default 5e-5 13 | yLwDJh ukb-d-20450 Feelings of worthlessness during worst period of depression || id:ukb-d-20450 Anhedonia Weighted median 53 0.0017842386739103193 0.0032700539436058087 0.5853204789173188 -0.004625067055557065 0.008193544403377703 1.0017858313748451 0.9953856120968017 1.0082272033542228 default 5e-5 14 | yLwDJh ukb-d-20450 Feelings of worthlessness during worst period of depression || id:ukb-d-20450 Anhedonia Inverse variance weighted 53 0.003404612047814585 0.0026053038907601074 0.19128052478240376 -0.001701783578075225 0.008511007673704395 1.0034104143223752 0.9982996636345342 1.0085473292708536 default 5e-5 15 | yLwDJh ukb-d-20450 Feelings of worthlessness during worst period of depression || id:ukb-d-20450 Anhedonia Simple mode 53 -0.0076750612414168695 0.008186411576682337 0.3528167895146004 -0.02372042793171425 0.00837030544888051 0.9923543168335581 0.9765586901300898 1.008405434400481 default 5e-5 16 | yLwDJh ukb-d-20450 Feelings of worthlessness during worst period of depression || id:ukb-d-20450 Anhedonia Weighted mode 53 -0.005938995165798461 0.0072897935575707605 0.4189596457281912 -0.02022699053863715 0.00834900020704023 0.9940786058047268 0.979976202732243 1.0083839503076908 default 5e-5 17 | yLwDJh ukb-a-220 Illnesses of siblings: Severe depression || id:ukb-a-220 Anhedonia MR Egger 53 4.0904122998036203e-4 0.001407911468583898 0.7725885767803272 -0.0023504652484440777 0.003168547708404802 1.000409124898752 0.997652294932005 1.0031735728617728 default 5e-5 18 | yLwDJh ukb-a-220 Illnesses of siblings: Severe depression || id:ukb-a-220 Anhedonia Weighted median 53 -3.3357904514731755e-4 7.614092432302466e-4 0.6613084101213078 -0.001825941161878601 0.0011587830715839658 0.9996664765861564 0.9981757248545144 1.0011594547200942 default 5e-5 19 | yLwDJh ukb-a-220 Illnesses of siblings: Severe depression || id:ukb-a-220 Anhedonia Inverse variance weighted 53 1.6368219487620844e-4 5.46034200774808e-4 0.7643560612081681 -9.065448386424152e-4 0.0012339092283948322 1.0001636955915376 0.999093865948988 1.0012346708075945 default 5e-5 20 | yLwDJh ukb-a-220 Illnesses of siblings: Severe depression || id:ukb-a-220 Anhedonia Simple mode 53 -0.001168510158050154 0.0018221312739722677 0.5241524528448629 -0.004739887455035799 0.0024028671389354907 0.9988321722841051 0.9952713280843788 1.0024057563378361 default 5e-5 21 | yLwDJh ukb-a-220 Illnesses of siblings: Severe depression || id:ukb-a-220 Anhedonia Weighted mode 53 -0.001342651014327647 0.0015991418312698142 0.404972302257265 -0.004476969003616483 0.0017916669749611885 0.9986582499382788 0.9955330376833345 1.0017932729692283 default 5e-5 22 | yLwDJh ebi-a-GCST90016613 Major depressive disorder vs anorexia nervosa (ordinary least squares (OLS)) || id:ebi-a-GCST90016613 Anhedonia MR Egger 39 0.0024107427606372663 0.00234275371732158 0.3101500185342142 -0.002181054525313031 0.0070025400465875635 1.0024136509374522 0.9978213222458383 1.0070271151593875 default 5e-5 23 | yLwDJh ebi-a-GCST90016613 Major depressive disorder vs anorexia nervosa (ordinary least squares (OLS)) || id:ebi-a-GCST90016613 Anhedonia Weighted median 39 0.0020859901576994085 0.0015571267169583705 0.18036222008093655 -9.659782075389979e-4 0.005137958522937814 1.0020881673487716 0.999034488199218 1.0051511804667301 default 5e-5 24 | yLwDJh ebi-a-GCST90016613 Major depressive disorder vs anorexia nervosa (ordinary least squares (OLS)) || id:ebi-a-GCST90016613 Anhedonia Inverse variance weighted 39 0.0024777226921478736 0.0010114627431782566 0.014299789041953262 4.952557155184908e-4 0.0044601896687772565 1.0024807947837573 1.0004953783748787 1.0044701511191978 default 5e-5 25 | yLwDJh ebi-a-GCST90016613 Major depressive disorder vs anorexia nervosa (ordinary least squares (OLS)) || id:ebi-a-GCST90016613 Anhedonia Simple mode 39 0.0010648788015131042 0.002644975628026704 0.6894952928872491 -0.004119273429419235 0.006249031032445443 1.0010654459862538 0.9958891991397718 1.006268596961668 default 5e-5 26 | yLwDJh ebi-a-GCST90016613 Major depressive disorder vs anorexia nervosa (ordinary least squares (OLS)) || id:ebi-a-GCST90016613 Anhedonia Weighted mode 39 0.0016537514045250716 0.001993469290920584 0.41195495159154794 -0.002253448405679273 0.005560951214729416 1.0016551196054966 0.99774908870307355 1.005576442005134 default 5e-5 27 | yLwDJh ieu-a-1188 Major Depressive Disorder || id:ieu-a-1188 Anhedonia MR Egger 53 -0.008159998935108482 0.016451692500233022 0.6220270120941598 -0.0404053162355652 0.024085318365348243 0.9918732034842553 0.9604000945028592 1.024377712394311 default 5e-5 28 | yLwDJh ieu-a-1188 Major Depressive Disorder || id:ieu-a-1188 Anhedonia Weighted median 53 0.005601966829703334 0.009042250404161716 0.5355657036665677 -0.01212084396245363 0.023324777621860297 1.0056176871871487 0.9879523175752051 1.0235989275936388 default 5e-5 29 | yLwDJh ieu-a-1188 Major Depressive Disorder || id:ieu-a-1188 Anhedonia Inverse variance weighted 53 5.508944759214749e-4 0.006198606167048727 0.9291821042738491 -0.01159837361149403 0.01270016256333698 1.0005510462461518 0.988468628236061 1.0127811521249321 default 5e-5 30 | yLwDJh ieu-a-1188 Major Depressive Disorder || id:ieu-a-1188 Anhedonia Simple mode 53 0.012685036966604252 0.01921941875449414 0.5121594420985289 -0.024985023792204263 0.050355097725412766 1.0127658333214997 0.9753245185816156 1.0516444666386815 default 5e-5 31 | yLwDJh ieu-a-1188 Major Depressive Disorder || id:ieu-a-1188 Anhedonia Weighted mode 53 0.01443747995149322 0.01846893072686956 0.4379257496159663 -0.021761624273171118 0.05063658417615756 1.014542203740768 0.9784734515737283 1.0519405319742765 default 5e-5 32 | yLwDJh ukb-d-20449 Feelings of tiredness during worst episode of depression || id:ukb-d-20449 Anhedonia MR Egger 53 -3.098606601042934e-4 0.0042556635582343275 0.9422410416224278 -0.008650961234243575 0.008031239914034989 0.999690187341752 0.9913863506587929 1.0080635768318598 default 5e-5 33 | yLwDJh ukb-d-20449 Feelings of tiredness during worst episode of depression || id:ukb-d-20449 Anhedonia Weighted median 53 0.0020623146089503064 0.0024287396249240622 0.39580920361024186 -0.0026980150559008553 0.006822644273801469 1.0020644426423635 0.9973056213156565 1.0068459715322642 default 5e-5 34 | yLwDJh ukb-d-20449 Feelings of tiredness during worst episode of depression || id:ukb-d-20449 Anhedonia Inverse variance weighted 53 0.0012591261003580736 0.0016508761628691994 0.44564130044310685 -0.001976591178865557 0.004494843379581705 1.0012599191324338 0.9980253609910529 1.0045049603404572 default 5e-5 35 | yLwDJh ukb-d-20449 Feelings of tiredness during worst episode of depression || id:ukb-d-20449 Anhedonia Simple mode 53 0.0059127768529557215 0.0062093766650660005 0.3453839487069772 -0.006257601410573639 0.018083155116485082 1.0059302918216966 0.9937619366021916 1.018247645370977 default 5e-5 36 | yLwDJh ukb-d-20449 Feelings of tiredness during worst episode of depression || id:ukb-d-20449 Anhedonia Weighted mode 53 0.0055773069425386484 0.005081501740674669 0.27744855862384415 -0.004382436469183702 0.015537050354261 1.0055928890742123 0.9956271523928791 1.0156583778639157 default 5e-5 37 | yLwDJh ebi-a-GCST009980 Major depressive disorder in trauma exposed individuals || id:ebi-a-GCST009980 Anhedonia MR Egger 51 -0.026412018966462097 0.02153742908902793 0.22593478789770735 -0.06862537998095684 0.015801342048032647 0.9739337277621655 0.9336763884366525 1.015926843411939 default 5e-5 38 | yLwDJh ebi-a-GCST009980 Major depressive disorder in trauma exposed individuals || id:ebi-a-GCST009980 Anhedonia Weighted median 51 -0.015411963249451793 0.013338201919986602 0.2478958299149642 -0.041554839012625536 0.010730912513721946 0.9847061932693775 0.9592967270136668 1.01078869525764 default 5e-5 39 | yLwDJh ebi-a-GCST009980 Major depressive disorder in trauma exposed individuals || id:ebi-a-GCST009980 Anhedonia Inverse variance weighted 51 -0.0056679110699724864 0.009325606091669478 0.5433338083061929 -0.023946099009644662 0.012610276869699687 0.9943481212337841 0.9763383339427701 1.0126901216797992 default 5e-5 40 | yLwDJh ebi-a-GCST009980 Major depressive disorder in trauma exposed individuals || id:ebi-a-GCST009980 Anhedonia Simple mode 51 -0.018166579500491165 0.026621459070027467 0.4981332163142378 -0.07034463927774501 0.03401148027676267 0.9819974380902327 0.9320725357400335 1.0345964841139152 default 5e-5 41 | yLwDJh ebi-a-GCST009980 Major depressive disorder in trauma exposed individuals || id:ebi-a-GCST009980 Anhedonia Weighted mode 51 -0.02628059936414401 0.02013072406972184 0.19769906697567796 -0.06573681854079881 0.013175619812510794 0.9740617301561798 0.9363772690016396 1.0132628007581301 default 5e-5 42 | yLwDJh ukb-d-20544_11 Mental health problems ever diagnosed by a professional: Depression || id:ukb-d-20544_11 Anhedonia MR Egger 53 2.793391080512811e-4 0.0031256495882704635 0.9291379598493497 -0.005846934084958827 0.00640561230106139 1.000279378126853 0.9941701259682748 1.006426172111485 default 5e-5 43 | yLwDJh ukb-d-20544_11 Mental health problems ever diagnosed by a professional: Depression || id:ukb-d-20544_11 Anhedonia Weighted median 53 0.001411117492394638 0.0017729450115749493 0.4260801426213719 -0.0020638547302922624 0.004886089715081539 1.0014121135871639 0.9979382735534736 1.0048980461168524 default 5e-5 44 | yLwDJh ukb-d-20544_11 Mental health problems ever diagnosed by a professional: Depression || id:ukb-d-20544_11 Anhedonia Inverse variance weighted 53 7.761350907464986e-4 0.0012230525403599526 0.5256968230737111 -0.0016210478883590083 0.0031733180698520057 1.0007764363615232 0.9983802653000928 1.003178358373724 default 5e-5 45 | yLwDJh ukb-d-20544_11 Mental health problems ever diagnosed by a professional: Depression || id:ukb-d-20544_11 Anhedonia Simple mode 53 0.0017690141834378163 0.003752953522095669 0.6393511972327901 -0.005586774719869695 0.009124803086745327 1.0017705798120988 0.9944288022841113 1.0091665610167562 default 5e-5 46 | yLwDJh ukb-d-20544_11 Mental health problems ever diagnosed by a professional: Depression || id:ukb-d-20544_11 Anhedonia Weighted mode 53 0.0013100774171826597 0.003523122421625339 0.7115146556049923 -0.005595242529203005 0.008215397363568324 1.001310935943473 0.9944203816862701 1.0082492363439028 default 5e-5 47 | yLwDJh ukb-e-2050_AFR Frequency of depressed mood in last 2 weeks || id:ukb-e-2050_AFR Anhedonia MR Egger 37 -0.01784253025831919 0.03123004808892526 0.5714297002033644 -0.0790534245126127 0.04336836399597431 0.9823157051801802 0.9239905593811526 1.0443225148208342 default 5e-5 48 | yLwDJh ukb-e-2050_AFR Frequency of depressed mood in last 2 weeks || id:ukb-e-2050_AFR Anhedonia Weighted median 37 -0.025298719118315254 0.016681900948861707 0.1293836355011731 -0.0579952449780842 0.007397806741453693 0.975018611821964 0.9436544345236475 1.0074252381160262 default 5e-5 49 | yLwDJh ukb-e-2050_AFR Frequency of depressed mood in last 2 weeks || id:ukb-e-2050_AFR Anhedonia Inverse variance weighted 37 -0.005913584212964301 0.011716082870391316 0.6137409502123194 -0.02887710663893128 0.017049938213002675 0.9941038666102416 0.9715358524367649 1.017196118013314 default 5e-5 50 | yLwDJh ukb-e-2050_AFR Frequency of depressed mood in last 2 weeks || id:ukb-e-2050_AFR Anhedonia Simple mode 37 -0.01852058959947528 0.030251091362718124 0.5442342537027152 -0.0778127286704028 0.04077154947145224 0.9816498626062178 0.9251376620820467 1.0416141210661742 default 5e-5 51 | yLwDJh ukb-e-2050_AFR Frequency of depressed mood in last 2 weeks || id:ukb-e-2050_AFR Anhedonia Weighted mode 37 -0.02671157274149033 0.025324551306581938 0.2985583627893747 -0.07634769330239093 0.022924547819410265 0.9736420259297608 0.9264940147870206 1.0231893347681553 default 5e-5 52 | yLwDJh ieu-b-102 Major depression || id:ieu-b-102 Anhedonia MR Egger 50 0.006127092928621339 0.009213617779421323 0.5092306036089245 -0.011931597919044454 0.024185783776287134 1.0061459019577668 0.9881393013347933 1.0244806320919917 default 5e-5 53 | yLwDJh ieu-b-102 Major depression || id:ieu-b-102 Anhedonia Weighted median 50 0.004388190246937582 0.004677292329294155 0.348146627498046 -0.004779302718478961 0.013555683212354125 1.0043978324525444 0.9952320999758831 1.0136479780543808 default 5e-5 54 | yLwDJh ieu-b-102 Major depression || id:ieu-b-102 Anhedonia Inverse variance weighted 50 0.002193358335701243 0.003549812608724004 0.5366544210924076 -0.004764274377397805 0.009150991048800291 1.0021957655057028 0.9952470567757241 1.0091929893784142 default 5e-5 55 | yLwDJh ieu-b-102 Major depression || id:ieu-b-102 Anhedonia Simple mode 50 0.008262728489624449 0.011897136227708513 0.4906399554463483 -0.015055658516684237 0.031581115495933135 1.00829695904498 0.9850571112595827 1.0320850902942649 default 5e-5 56 | yLwDJh ieu-b-102 Major depression || id:ieu-b-102 Anhedonia Weighted mode 50 0.011412080825148427 0.011053091171495616 0.3069171734207214 -0.010251977870982979 0.03307613952127983 1.0114774470377097 0.9898003945277947 1.0336292362805213 default 5e-5 57 | yLwDJh ebi-a-GCST005904 Major depressive disorder (probable) || id:ebi-a-GCST005904 Anhedonia MR Egger 51 -0.0020843821879810705 0.0027162314770019695 0.4465375552680496 -0.007408195882904931 0.0032394315069427895 0.9979177886280397 0.9926191771635424 1.003244684135499 default 5e-5 58 | yLwDJh ebi-a-GCST005904 Major depressive disorder (probable) || id:ebi-a-GCST005904 Anhedonia Weighted median 51 -1.4420513085540193e-4 0.0014212686445715824 0.9191835138894148 -0.0029298916742157037 0.0026414814125048994 0.9998558052662047 0.9970743962696363 1.0026449731983502 default 5e-5 59 | yLwDJh ebi-a-GCST005904 Major depressive disorder (probable) || id:ebi-a-GCST005904 Anhedonia Inverse variance weighted 51 4.435372144694346e-4 0.001066768714841997 0.6775736580482905 -0.0016473294666208796 0.002534403895559749 1.000443635591644 0.9983540266358135 1.0025376182119978 default 5e-5 60 | yLwDJh ebi-a-GCST005904 Major depressive disorder (probable) || id:ebi-a-GCST005904 Anhedonia Simple mode 51 -0.001094000703058852 0.0033512987269032984 0.7454533821483131 -0.007662546207789316 0.005474544801671612 0.9989065974975464 0.9923667362589184 1.0054895575054679 default 5e-5 61 | yLwDJh ebi-a-GCST005904 Major depressive disorder (probable) || id:ebi-a-GCST005904 Anhedonia Weighted mode 51 -7.534252650019634e-4 0.0026303937410933078 0.7757318589756681 -0.005908996997544847 0.00440214646754092 0.9992468584885462 0.9941084267892863 1.0044118501480843 default 5e-5 62 | yLwDJh ukb-b-5942 Illnesses of father: Severe depression || id:ukb-b-5942 Anhedonia MR Egger 47 7.687113197211361e-4 0.0010041375720940802 0.4479445839747518 -0.001199398321583261 0.0027368209610255335 1.0007690068539896 0.9988013206691029 1.0027405694744018 default 5e-5 63 | yLwDJh ukb-b-5942 Illnesses of father: Severe depression || id:ukb-b-5942 Anhedonia Weighted median 47 5.098287414644827e-4 5.091445600054336e-4 0.31666063093912605 -4.8809459614616716e-4 0.0015077520790751325 1.0005099587262263 0.9995120245026433 1.0015088893087227 default 5e-5 64 | yLwDJh ukb-b-5942 Illnesses of father: Severe depression || id:ukb-b-5942 Anhedonia Inverse variance weighted 47 4.261090800245837e-4 3.6152350180464096e-4 0.23853822910418584 -2.8247698351251257e-4 0.00113469514356168 1.0004261998773947 0.9997175629093542 1.0011353391536582 default 5e-5 65 | yLwDJh ukb-b-5942 Illnesses of father: Severe depression || id:ukb-b-5942 Anhedonia Simple mode 47 8.142883608783791e-4 0.0010665366802501276 0.449070430973603 -0.0012761235324118708 0.002904700254168629 1.0008146199836518 0.9987246903669742 1.0029089229835497 default 5e-5 66 | yLwDJh ukb-b-5942 Illnesses of father: Severe depression || id:ukb-b-5942 Anhedonia Weighted mode 47 7.816190805302204e-4 9.695624916386095e-4 0.4243007906145483 -0.0011187234030814541 0.0026819615641418947 1.0007819246243248 0.9988819021346552 1.0026855612404029 default 5e-5 67 | yLwDJh ukb-d-20448 Professional informed about depression || id:ukb-d-20448 Anhedonia MR Egger 53 0.0011033960642013161 0.004884357437209459 0.8221789526457801 -0.008469944512729224 0.010676736641131855 1.0011040050295947 0.9915658244091281 1.0107339363813883 default 5e-5 68 | yLwDJh ukb-d-20448 Professional informed about depression || id:ukb-d-20448 Anhedonia Weighted median 53 -0.001612731474866006 0.002826994144363212 0.5683550962216228 -0.007153639997817902 0.00392817704808589 0.9983885682777278 0.992871886379684 1.0039359024478136 default 5e-5 69 | yLwDJh ukb-d-20448 Professional informed about depression || id:ukb-d-20448 Anhedonia Inverse variance weighted 53 -0.001764222327214225 0.0019100573132192528 0.35566914775482644 -0.00550793466112396 0.0019794900066955104 0.9982373329982146 0.9945072061999459 1.0019814504904114 default 5e-5 70 | yLwDJh ukb-d-20448 Professional informed about depression || id:ukb-d-20448 Anhedonia Simple mode 53 -4.6195834826513044e-4 0.006329195098883196 0.9420953144816073 -0.012867180742076195 0.011943264045545934 0.9995381483380638 0.9872152475095484 1.012014869607676 default 5e-5 71 | yLwDJh ukb-d-20448 Professional informed about depression || id:ukb-d-20448 Anhedonia Weighted mode 53 -4.6195834826513044e-4 0.0060514393154153375 0.9394426821210529 -0.012322779406479191 0.01139886270994893 0.9995381483380638 0.9877528351272457 1.0114640773006547 default 5e-5 72 | yLwDJh ebi-a-GCST009983 Trauma exposure in major depressive disorder || id:ebi-a-GCST009983 Anhedonia MR Egger 38 -0.023313828091997734 0.024189300902093078 0.3415723768005492 -0.07072485786010016 0.024097201676104695 0.9769558394719283 0.9317182118063827 1.0243898854653275 default 5e-5 73 | yLwDJh ebi-a-GCST009983 Trauma exposure in major depressive disorder || id:ebi-a-GCST009983 Anhedonia Weighted median 38 -0.02984739421542112 0.015376017372183963 0.05223820816865838 -0.059984388264901684 2.8959983405944453e-4 0.9705936404512441 0.941779236277439 1.0002896417721396 default 5e-5 74 | yLwDJh ebi-a-GCST009983 Trauma exposure in major depressive disorder || id:ebi-a-GCST009983 Anhedonia Inverse variance weighted 38 -0.027466953389794782 0.01081408730418804 0.011087674982479562 -0.04866256450600334 -0.006271342273586226 0.9729068332951004 0.95250248362344 0.9937482815493699 default 5e-5 75 | yLwDJh ebi-a-GCST009983 Trauma exposure in major depressive disorder || id:ebi-a-GCST009983 Anhedonia Simple mode 38 -0.018820743424517006 0.02411561882718456 0.44009771354588834 -0.06608735632579874 0.02844586947676473 0.9813552608602372 0.9360490909106106 1.0288543169046598 default 5e-5 76 | yLwDJh ebi-a-GCST009983 Trauma exposure in major depressive disorder || id:ebi-a-GCST009983 Anhedonia Weighted mode 38 -0.026212395327793125 0.01770047353115319 0.14710297167197417 -0.060905323448853375 0.008480532793267125 0.9741281673634484 0.9409123178923282 1.0085165943799022 default 5e-5 77 | yLwDJh ebi-a-GCST009979 Major depressive disorder || id:ebi-a-GCST009979 Anhedonia MR Egger 51 -0.00995516135203452 0.011691675244826944 0.39864815355520944 -0.03287084483189533 0.01296052212782629 0.9900942272403964 0.967663530264474 1.0130448737143516 default 5e-5 78 | yLwDJh ebi-a-GCST009979 Major depressive disorder || id:ebi-a-GCST009979 Anhedonia Weighted median 51 0.008082544441010918 0.007911297270811076 0.3069485237731774 -0.0074235982097787916 0.023588687091800627 1.008115296383543 0.9926038886362542 1.023869100693103 default 5e-5 79 | yLwDJh ebi-a-GCST009979 Major depressive disorder || id:ebi-a-GCST009979 Anhedonia Inverse variance weighted 51 0.012221352929587289 0.00506308945795918 0.015786547010948587 0.0022976975919872956 0.02214500826718728 1.0122963388283153 1.002300339322011 1.02239202901835 default 5e-5 80 | yLwDJh ebi-a-GCST009979 Major depressive disorder || id:ebi-a-GCST009979 Anhedonia Simple mode 51 0.031682119283011706 0.016607663747299158 0.06218409434523512 -8.689016616946418e-4 0.06423314022771806 1.032189340061694 0.9991314757240426 1.0663409767617609 default 5e-5 81 | yLwDJh ebi-a-GCST009979 Major depressive disorder || id:ebi-a-GCST009979 Anhedonia Weighted mode 51 -0.005010001073942644 0.010347120103273705 0.6303632241782278 -0.025290356476359105 0.015270354328473817 0.9950025280490652 0.9750267655876087 1.0153875419280212 default 5e-5 82 | yLwDJh ukb-a-247 Seen a psychiatrist for nerves anxiety tension or depression || id:ukb-a-247 Anhedonia MR Egger 53 -0.002439199968012905 0.0015801214488990677 0.1288491127796851 -0.005536238007855078 6.578380718292678e-4 0.9975637724629534 0.9944790587159981 1.000658054494748 default 5e-5 83 | yLwDJh ukb-a-247 Seen a psychiatrist for nerves anxiety tension or depression || id:ukb-a-247 Anhedonia Weighted median 53 3.7976531627256945e-4 8.563632802335941e-4 0.65743097150162 -0.0012987067129852752 0.002058237345530414 1.0003798374362496 0.9987021362416215 1.0020603569699964 default 5e-5 84 | yLwDJh ukb-a-247 Seen a psychiatrist for nerves anxiety tension or depression || id:ukb-a-247 Anhedonia Inverse variance weighted 53 1.9787900415426808e-4 6.320251318328954e-4 0.7542143831062909 -0.001040890254238207 0.001436648262546743 1.0001978985834958 0.9989596512841122 1.0014376807360363 default 5e-5 85 | yLwDJh ukb-a-247 Seen a psychiatrist for nerves anxiety tension or depression || id:ukb-a-247 Anhedonia Simple mode 53 0.0017020690698926616 0.0022041414586451646 0.4434832293224992 -0.0026180481890518605 0.006022186328837184 1.0017035184116285 0.9973853759103041 1.0060403561486284 default 5e-5 86 | yLwDJh ukb-a-247 Seen a psychiatrist for nerves anxiety tension or depression || id:ukb-a-247 Anhedonia Weighted mode 53 0.0015224986874318638 0.0019437941444192957 0.43702663997901736 -0.002287337835629956 0.005332335210493684 1.001523658276975 0.9977152761281712 1.0053465774133725 default 5e-5 87 | yLwDJh ukb-d-20437 Thoughts of death during worst depression || id:ukb-d-20437 Anhedonia MR Egger 53 0.011318086956327224 0.0052695715014633195 0.036501822150637374 9.897268134591176e-4 0.02164644709919533 1.0113823788272218 1.0009902167546645 1.0218824310976398 default 5e-5 88 | yLwDJh ukb-d-20437 Thoughts of death during worst depression || id:ukb-d-20437 Anhedonia Weighted median 53 0.0012760238359031386 0.0029079532067801048 0.6608029793549365 -0.004423564449385867 0.006975612121192144 1.0012768383007067 0.9955862051011123 1.0069999983734603 default 5e-5 89 | yLwDJh ukb-d-20437 Thoughts of death during worst depression || id:ukb-d-20437 Anhedonia Inverse variance weighted 53 0.0029500504964880794 0.0020597235112557876 0.15207068996558007 -0.001087007585573264 0.0069871085785494225 1.0029544061775606 0.998913582993165 1.0070115753725475 default 5e-5 90 | yLwDJh ukb-d-20437 Thoughts of death during worst depression || id:ukb-d-20437 Anhedonia Simple mode 53 -0.001035984540016778 0.0065080884927716225 0.874140461228093 -0.013791837985849159 0.011719868905815603 0.9989645519067006 0.9863028336798129 1.011788815655088 default 5e-5 91 | yLwDJh ukb-d-20437 Thoughts of death during worst depression || id:ukb-d-20437 Anhedonia Weighted mode 53 -3.863324127174328e-4 0.005867973650381681 0.9477597136077507 -0.011887560767465527 0.011114895942030661 0.9996137422040399 0.9881828171331362 1.0111768958926761 default 5e-5 92 | yLwDJh ukb-d-20126_4 Bipolar and major depression status: Probable Recurrent major depression (moderate) || id:ukb-d-20126_4 Anhedonia MR Egger 53 0.0023037913791812002 0.0029429898058540996 0.4373606990539387 -0.003464468640292835 0.008072051398655236 1.002306447145593 0.9965415257067797 1.0081047182425371 default 5e-5 93 | yLwDJh ukb-d-20126_4 Bipolar and major depression status: Probable Recurrent major depression (moderate) || id:ukb-d-20126_4 Anhedonia Weighted median 53 8.838617381104941e-4 0.0017124850110514429 0.6057649011692935 -0.002472608883550334 0.004240332359771322 1.0008842524590025 0.997530445495848 1.0042493352896724 default 5e-5 94 | yLwDJh ukb-d-20126_4 Bipolar and major depression status: Probable Recurrent major depression (moderate) || id:ukb-d-20126_4 Anhedonia Inverse variance weighted 53 0.0013715274406459156 0.0011528894764504876 0.23418655153686696 -8.8813593319704e-4 0.003631190814488871 1.0013724684145475 0.9991122583427887 1.0036377915749766 default 5e-5 95 | yLwDJh ukb-d-20126_4 Bipolar and major depression status: Probable Recurrent major depression (moderate) || id:ukb-d-20126_4 Anhedonia Simple mode 53 0.0011527468965197817 0.003532249636986922 0.7454700196145159 -0.005770462391974585 0.008075956185014149 1.001153411564597 0.9942461547479097 1.0081086546837748 default 5e-5 96 | yLwDJh ukb-d-20126_4 Bipolar and major depression status: Probable Recurrent major depression (moderate) || id:ukb-d-20126_4 Anhedonia Weighted mode 53 0.0014984812237260024 0.003803980689881565 0.6952475446463025 -0.0059573209284418645 0.008954283375893868 1.0014996045077182 0.9940603887230695 1.0089944928974905 default 5e-5 97 | yLwDJh ukb-d-20435 Difficulty concentrating during worst depression || id:ukb-d-20435 Anhedonia MR Egger 53 0.006904144132138188 0.004903186500253903 0.16517028129521827 -0.0027061014083594624 0.016514389672635837 1.0069280326802514 0.9972975567835 1.0166515059631562 default 5e-5 98 | yLwDJh ukb-d-20435 Difficulty concentrating during worst depression || id:ukb-d-20435 Anhedonia Weighted median 53 0.001458068235363709 0.0025457740389706173 0.5668203207744245 -0.0035316488810187008 0.006447785351746119 1.0014591317336747 0.996474580055927 1.0064686170684625 default 5e-5 99 | yLwDJh ukb-d-20435 Difficulty concentrating during worst depression || id:ukb-d-20435 Anhedonia Inverse variance weighted 53 0.003249394292346939 0.001910769166823354 0.08902400045267582 -4.957132746268352e-4 0.006994501859320713 1.0032546792967845 0.9995044095708989 1.007019020519386 default 5e-5 100 | yLwDJh ukb-d-20435 Difficulty concentrating during worst depression || id:ukb-d-20435 Anhedonia Simple mode 53 0.00124588975346928 0.005151907628298266 0.809862468691773 -0.00885184919799532 0.01134362870493388 1.001246666196529 0.9911872130763593 1.011408211631593 default 5e-5 101 | yLwDJh ukb-d-20435 Difficulty concentrating during worst depression || id:ukb-d-20435 Anhedonia Weighted mode 53 0.00124588975346928 0.0048440123695212955 0.7980378679823781 -0.00824837449079246 0.01074015399773102 1.001246666196529 0.9917855500119986 1.0107980364883669 default 5e-5 102 | yLwDJh ebi-a-GCST90016607 Bipolar disorder vs major depressive disorder (ordinary least squares (OLS)) || id:ebi-a-GCST90016607 Anhedonia MR Egger 49 -6.079244131555508e-4 0.0026814318729110444 0.8216275213137032 -0.005863530884061198 0.004647682057750097 0.9993922603354509 0.9941536260633437 1.004658499283855 default 5e-5 103 | yLwDJh ebi-a-GCST90016607 Bipolar disorder vs major depressive disorder (ordinary least squares (OLS)) || id:ebi-a-GCST90016607 Anhedonia Weighted median 49 -0.001389909396108231 0.0015583435610289588 0.37243870079603264 -0.00444426277572499 0.0016644439835085281 0.9986110560805963 0.9955655983462037 1.0016658299392376 default 5e-5 104 | yLwDJh ebi-a-GCST90016607 Bipolar disorder vs major depressive disorder (ordinary least squares (OLS)) || id:ebi-a-GCST90016607 Anhedonia Inverse variance weighted 49 -2.5376166539924343e-4 0.0011252348584383579 0.8215756669013243 -0.002459221987938425 0.001951698657139938 0.9997462705293688 0.9975437994211751 1.0019536044606137 default 5e-5 105 | yLwDJh ebi-a-GCST90016607 Bipolar disorder vs major depressive disorder (ordinary least squares (OLS)) || id:ebi-a-GCST90016607 Anhedonia Simple mode 49 -0.0012235117759254177 0.003111406541918544 0.695887624448404 -0.007321868598085764 0.004874845046234928 0.9987772364094385 0.9927048709807704 1.0048867464346298 default 5e-5 106 | yLwDJh ebi-a-GCST90016607 Bipolar disorder vs major depressive disorder (ordinary least squares (OLS)) || id:ebi-a-GCST90016607 Anhedonia Weighted mode 49 -0.0019661895764487083 0.002250660348585864 0.38668283666507874 -0.006377483859677002 0.0024451047067795854 0.9980357421080498 0.9936428091281954 1.0024480964131413 default 5e-5 107 | yLwDJh ukb-b-18336 Seen a psychiatrist for nerves, anxiety, tension or depression || id:ukb-b-18336 Anhedonia MR Egger 53 -0.0013860342982873024 0.0013515084955129395 0.3099453980823707 -0.004034990949492664 0.001262922352918059 0.9986149258036214 0.9959731386884744 1.00126372017518 default 5e-5 108 | yLwDJh ukb-b-18336 Seen a psychiatrist for nerves, anxiety, tension or depression || id:ukb-b-18336 Anhedonia Weighted median 53 9.603905850828841e-4 7.203138672024196e-4 0.18243514708064978 -4.5142459463385807e-4 0.0023722057647996265 1.0009608519077924 0.999548677282118 1.002375021671091 default 5e-5 109 | yLwDJh ukb-b-18336 Seen a psychiatrist for nerves, anxiety, tension or depression || id:ukb-b-18336 Anhedonia Inverse variance weighted 53 3.719834456497135e-4 5.343095188974689e-4 0.48630691758097133 -6.752632113893255e-4 0.0014192301026887525 1.000372052640071 0.9993249647275039 1.0014202376863388 default 5e-5 110 | yLwDJh ukb-b-18336 Seen a psychiatrist for nerves, anxiety, tension or depression || id:ukb-b-18336 Anhedonia Simple mode 53 0.0017299982662226532 0.0017775623474195832 0.3349387850828567 -0.00175402393471973 0.0052140204671650365 1.0017314955765468 0.9982475134662513 1.0052276371274431 default 5e-5 111 | yLwDJh ukb-b-18336 Seen a psychiatrist for nerves, anxiety, tension or depression || id:ukb-b-18336 Anhedonia Weighted mode 53 0.0014746299149721968 0.0016245586288019182 0.36821842269932714 -0.0017095049974795626 0.004658764827423957 1.001475717716301 0.9982919553738994 1.0046696337443037 default 5e-5 112 | yLwDJh ebi-a-GCST90016616 Major depressive disorder vs Tourette's syndrome and other tic disorders (ordinary least squares (OLS)) || id:ebi-a-GCST90016616 Anhedonia MR Egger 50 0.003403190344798047 0.002279780332967426 0.14204137789557295 -0.0010651791078181085 0.007871559797414203 1.0034089877717765 0.9989353879940749 1.0079026219733374 default 5e-5 113 | yLwDJh ebi-a-GCST90016616 Major depressive disorder vs Tourette's syndrome and other tic disorders (ordinary least squares (OLS)) || id:ebi-a-GCST90016616 Anhedonia Weighted median 50 0.0026124491502149817 0.0014903847333184522 0.07962450125779047 -3.087049270891844e-4 0.005533603227519147 1.0026158645690513 0.999691342717374 1.0055489418894972 default 5e-5 114 | yLwDJh ebi-a-GCST90016616 Major depressive disorder vs Tourette's syndrome and other tic disorders (ordinary least squares (OLS)) || id:ebi-a-GCST90016616 Anhedonia Inverse variance weighted 50 0.00145754257405381 9.55802937346509e-4 0.12727394818423263 -4.158311831453476e-4 0.0033309163312529675 1.0014586053054941 0.9995842552626584 1.00333646999761 default 5e-5 115 | yLwDJh ebi-a-GCST90016616 Major depressive disorder vs Tourette's syndrome and other tic disorders (ordinary least squares (OLS)) || id:ebi-a-GCST90016616 Anhedonia Simple mode 50 0.0014375360945538748 0.002749131255081141 0.6033965390307175 -0.0039507611654051615 0.006825833354512911 1.0014385698448571 0.9960570328240459 1.0068491824504513 default 5e-5 116 | yLwDJh ebi-a-GCST90016616 Major depressive disorder vs Tourette's syndrome and other tic disorders (ordinary least squares (OLS)) || id:ebi-a-GCST90016616 Anhedonia Weighted mode 50 0.002256137335831701 0.0019471777453954936 0.25220639105512804 -0.0015603310451434665 0.006072605716806869 1.002258684328766 0.9984408856384498 1.0060910813664148 default 5e-5 117 | yLwDJh ukb-a-81 Non-cancer illness code self-reported: depression || id:ukb-a-81 Anhedonia MR Egger 53 -5.955828896336202e-4 0.0010751812401598362 0.5820426035686865 -0.002702938120346899 0.0015117723410796586 0.9994045944346501 0.997300711527896 1.0015129156449512 default 5e-5 118 | yLwDJh ukb-a-81 Non-cancer illness code self-reported: depression || id:ukb-a-81 Anhedonia Weighted median 53 4.288016266512021e-5 5.960869812836377e-4 0.9426527742013431 -0.0011254503206508096 0.00121121064598105 1.0000428810820325 0.9988751827610384 1.0012119444578325 default 5e-5 119 | yLwDJh ukb-a-81 Non-cancer illness code self-reported: depression || id:ukb-a-81 Anhedonia Inverse variance weighted 53 -1.0002447055348159e-4 4.178431122619926e-4 0.8108087355694663 -9.189969705869871e-4 7.18948029480024e-4 0.9998999805317271 0.9990814251778014 1.0007192065345614 default 5e-5 120 | yLwDJh ukb-a-81 Non-cancer illness code self-reported: depression || id:ukb-a-81 Anhedonia Simple mode 53 0.0017151126323945807 0.001388022632209029 0.2221413126173708 -0.0010054117267351164 0.004435636991524277 1.0017165842792919 0.9989950935302904 1.004445488990529 default 5e-5 121 | yLwDJh ukb-a-81 Non-cancer illness code self-reported: depression || id:ukb-a-81 Anhedonia Weighted mode 53 0.0012776367897350451 0.001350492527954828 0.34849739171020355 -0.0013693285650564178 0.003924602144526508 1.0012784533153223 0.9986316085375205 1.0039323134801976 default 5e-5 122 | yLwDJh finn-b-ANTIDEPRESSANTS Depression medications || id:finn-b-ANTIDEPRESSANTS Anhedonia MR Egger 50 -0.019233407930354794 0.02108407878418339 0.36620969953159777 -0.06055820234735424 0.022091386486644653 0.9809503739234425 0.9412389851057905 1.0223372080071547 default 5e-5 123 | yLwDJh finn-b-ANTIDEPRESSANTS Depression medications || id:finn-b-ANTIDEPRESSANTS Anhedonia Weighted median 50 -0.0013831864836878747 0.011496871644722673 0.9042377305122676 -0.023917054907344314 0.021150681939968562 0.9986177696778358 0.9763666912250248 1.0213759429514377 default 5e-5 124 | yLwDJh finn-b-ANTIDEPRESSANTS Depression medications || id:finn-b-ANTIDEPRESSANTS Anhedonia Inverse variance weighted 50 0.00495687538619004 0.007796093548101447 0.5248968283066293 -0.010323467968088796 0.020237218740468875 1.0049691810170784 0.9897296361307669 1.0204433796106893 default 5e-5 125 | yLwDJh finn-b-ANTIDEPRESSANTS Depression medications || id:finn-b-ANTIDEPRESSANTS Anhedonia Simple mode 50 -0.014508984949604037 0.0284378226839111 0.6122018532485825 -0.07024711741006978 0.041229147510861715 0.9855957631643371 0.9321634376269164 1.0420908707173289 default 5e-5 126 | yLwDJh finn-b-ANTIDEPRESSANTS Depression medications || id:finn-b-ANTIDEPRESSANTS Anhedonia Weighted mode 50 -0.013757288667089862 0.025627221303567316 0.5938189401175689 -0.0639866424220818 0.03647206508790208 0.9863369103594665 0.9380175290892805 1.0371453310494172 default 5e-5 127 | yLwDJh ukb-d-20546_3 Substances taken for depression: Medication prescribed to you (for at least two weeks) || id:ukb-d-20546_3 Anhedonia MR Egger 53 7.282975907691091e-4 0.003260111616045171 0.8241193325884713 -0.005661521176679426 0.007118116358217645 1.000728562863855 0.994354475032475 1.0071435103652038 default 5e-5 128 | yLwDJh ukb-d-20546_3 Substances taken for depression: Medication prescribed to you (for at least two weeks) || id:ukb-d-20546_3 Anhedonia Weighted median 53 0.0012601435575147664 0.0018895992717816725 0.5048462193294166 -0.0024434710151773117 0.004963758130206845 1.0012609378720225 0.9975595118301304 1.0049760979865001 default 5e-5 129 | yLwDJh ukb-d-20546_3 Substances taken for depression: Medication prescribed to you (for at least two weeks) || id:ukb-d-20546_3 Anhedonia Inverse variance weighted 53 0.001503420541850383 0.0012757015687885852 0.23859538250329002 -9.96954532975244e-4 0.00400379561667601 1.001504551245083 0.9990035422610878 1.0040118215141223 default 5e-5 130 | yLwDJh ukb-d-20546_3 Substances taken for depression: Medication prescribed to you (for at least two weeks) || id:ukb-d-20546_3 Anhedonia Simple mode 53 0.0030630826031245034 0.004727953092886781 0.5199216871281196 -0.006203705458933586 0.012329870665182593 1.0030677786341942 0.9938154977908211 1.012406196895423 default 5e-5 131 | yLwDJh ukb-d-20546_3 Substances taken for depression: Medication prescribed to you (for at least two weeks) || id:ukb-d-20546_3 Anhedonia Weighted mode 53 0.0023357357994930675 0.003855337372459686 0.5472533797860785 -0.005220725450527917 0.009892197049514051 1.002338465755427 0.9947928788515153 1.0099412865649435 default 5e-5 132 | yLwDJh ukb-d-20126_5 Bipolar and major depression status: Single Probable major depression episode || id:ukb-d-20126_5 Anhedonia MR Egger 53 0.002563806915993818 0.0022352154567532793 0.25673157685086145 -0.0018172153792426092 0.0069448292112302456 1.002567096279442 0.9981844347569224 1.006969000460284 default 5e-5 133 | yLwDJh ukb-d-20126_5 Bipolar and major depression status: Single Probable major depression episode || id:ukb-d-20126_5 Anhedonia Weighted median 53 -7.753285869802264e-4 0.0012750333155745065 0.5431311245349999 -0.003274393885506259 0.0017237367115458065 0.9992249719025643 0.9967309610957853 1.0017252231996532 default 5e-5 134 | yLwDJh ukb-d-20126_5 Bipolar and major depression status: Single Probable major depression episode || id:ukb-d-20126_5 Anhedonia Inverse variance weighted 53 -2.2363312131844663e-4 8.779228553179742e-4 0.7989317912186317 -0.001944361917741676 0.0014970956751047828 0.9997763918827041 0.9980575271293631 1.0014982168822832 default 5e-5 135 | yLwDJh ukb-d-20126_5 Bipolar and major depression status: Single Probable major depression episode || id:ukb-d-20126_5 Anhedonia Simple mode 53 -0.0012247545418379892 0.0031293033563240457 0.6971137452362917 -0.007358189120233119 0.0049086800365571405 0.9987759951639061 0.9926688160762887 1.0049207473431774 default 5e-5 136 | yLwDJh ukb-d-20126_5 Bipolar and major depression status: Single Probable major depression episode || id:ukb-d-20126_5 Anhedonia Weighted mode 53 -0.0012247545418379892 0.0026758226967261186 0.649066639063918 -0.006469367027421182 0.0040198579437452035 0.9987759951639061 0.9935515142735809 1.0040279484098982 default 5e-5 137 | yLwDJh ukb-b-20045 Diagnoses - secondary ICD10: F32.9 Depressive episode, unspecified || id:ukb-b-20045 Anhedonia MR Egger 35 -0.0011422686305906833 9.398504223168903e-4 0.2328478587368654 -0.0029843754583317884 6.998381971504218e-4 0.9988583835098913 0.9970200733633545 1.0007000831410386 default 5e-5 138 | yLwDJh ukb-b-20045 Diagnoses - secondary ICD10: F32.9 Depressive episode, unspecified || id:ukb-b-20045 Anhedonia Weighted median 35 3.1786699417541363e-4 3.0213293537860816e-4 0.29276440284054317 -2.743135591666584e-4 9.100475475174857e-4 1.0003179175192416 0.9997257240613577 1.0009104617664304 default 5e-5 139 | yLwDJh ukb-b-20045 Diagnoses - secondary ICD10: F32.9 Depressive episode, unspecified || id:ukb-b-20045 Anhedonia Inverse variance weighted 35 1.2615537618627462e-4 2.124763441951522e-4 0.5526870589457806 -2.902982584362236e-4 5.426090108087729e-4 1.0001261633341103 0.9997097438740261 1.000542756249708 default 5e-5 140 | yLwDJh ukb-b-20045 Diagnoses - secondary ICD10: F32.9 Depressive episode, unspecified || id:ukb-b-20045 Anhedonia Simple mode 35 4.5218064096907463e-4 6.876309917508942e-4 0.5152279545072106 -8.955761028626782e-4 0.0017999373848008274 1.0004522828900462 0.999104824805725 1.0018015582444315 default 5e-5 141 | yLwDJh ukb-b-20045 Diagnoses - secondary ICD10: F32.9 Depressive episode, unspecified || id:ukb-b-20045 Anhedonia Weighted mode 35 4.0951926656124585e-4 7.243499675760977e-4 0.5755403072414541 -0.0010102066698879056 0.0018292452030103973 1.0004096031310237 0.9989903034170912 1.0018309192926347 default 5e-5 142 | yLwDJh ebi-a-GCST003769 Depression || id:ebi-a-GCST003769 Anhedonia MR Egger 41 4.3352986507329993e-4 0.010019965024266417 0.965709778700287 -0.01920560158248888 0.02007266131263548 1.000433623852727 0.9809776509500145 1.0202754718885012 default 5e-5 143 | yLwDJh ebi-a-GCST003769 Depression || id:ebi-a-GCST003769 Anhedonia Weighted median 41 1.0628974693034513e-4 0.004515854126857575 0.9812219093153179 -0.008744784341710502 0.008957363835571192 1.0001062953958857 0.9912933400740132 1.008997601069128 default 5e-5 144 | yLwDJh ebi-a-GCST003769 Depression || id:ebi-a-GCST003769 Anhedonia Inverse variance weighted 41 -0.0024785292654371533 0.0032311754846057424 0.4430414640034906 -0.008811633215264408 0.0038545746843901014 0.997524539752149 0.9912270754457502 1.0038620131116427 default 5e-5 145 | yLwDJh ebi-a-GCST003769 Depression || id:ebi-a-GCST003769 Anhedonia Simple mode 41 -0.00991633522326827 0.010110876479151978 0.33260653209106417 -0.029733653122406146 0.009900982675869606 0.9901326695126315 0.970704043111323 1.0099501595707059 default 5e-5 146 | yLwDJh ebi-a-GCST003769 Depression || id:ebi-a-GCST003769 Anhedonia Weighted mode 41 0.005978317751720599 0.010112720733419381 0.5577339310626446 -0.013842614885781389 0.025799250389222587 1.0059962235577065 0.9862527535509918 1.026134931607106 default 5e-5 147 | yLwDJh ukb-d-20546_1 Substances taken for depression: Unprescribed medication (more than once) || id:ukb-d-20546_1 Anhedonia MR Egger 53 -8.887024984672204e-5 0.0014114914452904072 0.9500429281913703 -0.00285539348261592 0.002677652982922476 0.999911133698997 0.9971486792759894 1.0026812410975314 default 5e-5 148 | yLwDJh ukb-d-20546_1 Substances taken for depression: Unprescribed medication (more than once) || id:ukb-d-20546_1 Anhedonia Weighted median 53 -0.0012615752384437283 7.487375495579993e-4 0.09200082034261703 -0.002729100835577407 2.0595035868995045e-4 0.998739220213055 0.9972746197746981 1.000205971567921 default 5e-5 149 | yLwDJh ukb-d-20546_1 Substances taken for depression: Unprescribed medication (more than once) || id:ukb-d-20546_1 Anhedonia Inverse variance weighted 53 -3.678299151430941e-5 5.523253314298599e-4 0.9469028491621725 -0.0011193406411168349 0.001045774658088216 0.9999632176849717 0.9988812855869427 1.0010463216710734 default 5e-5 150 | yLwDJh ukb-d-20546_1 Substances taken for depression: Unprescribed medication (more than once) || id:ukb-d-20546_1 Anhedonia Simple mode 53 -0.002737025288548531 0.0018086048790654664 0.13624923398672809 -0.006281890851516845 8.078402744197827e-4 0.9972667169501873 0.9937377989734668 1.0008081666652588 default 5e-5 151 | yLwDJh ukb-d-20546_1 Substances taken for depression: Unprescribed medication (more than once) || id:ukb-d-20546_1 Anhedonia Weighted mode 53 -0.00263722177451752 0.0018171786193120541 0.15271042837675025 -0.0061988918683691455 9.244483193341061e-4 0.9973662526398882 0.9938202816232378 1.000924875753385 default 5e-5 152 | yLwDJh ebi-a-GCST005902 Depression (broad) || id:ebi-a-GCST005902 Anhedonia MR Egger 50 0.001792325341964209 0.002528208095331003 0.4817964454915753 -0.0031629625248845578 0.006747613208812975 1.0017939325170802 0.9968420343713622 1.0067704296407705 default 5e-5 153 | yLwDJh ebi-a-GCST005902 Depression (broad) || id:ebi-a-GCST005902 Anhedonia Weighted median 50 0.00101450077861583 0.0012837338272721893 0.42936808049799613 -0.001501617522837661 0.003530619080069321 1.0010150155585975 0.9984995093406449 1.0035368590571132 default 5e-5 154 | yLwDJh ebi-a-GCST005902 Depression (broad) || id:ebi-a-GCST005902 Anhedonia Inverse variance weighted 50 1.275462760485461e-4 9.96565761371972e-4 0.8981602027729947 -0.0018257226162405192 0.0020808151683376114 1.0001275544104207 0.998175943001489 1.0020829815665842 default 5e-5 155 | yLwDJh ebi-a-GCST005902 Depression (broad) || id:ebi-a-GCST005902 Anhedonia Simple mode 50 0.003813348798740245 0.002983887942893734 0.2072776789187912 -0.0020350715693314737 0.009661769166811964 1.0038206288641387 0.9979669977848153 1.0097085947429985 default 5e-5 156 | yLwDJh ebi-a-GCST005902 Depression (broad) || id:ebi-a-GCST005902 Anhedonia Weighted mode 50 0.004003605436058197 0.0027986938153830463 0.15891243325979076 -0.001481834442092574 0.009489045314208968 1.004011630570552 0.998519262932455 1.0095342090452266 default 5e-5 157 | yLwDJh ukb-d-20126_3 Bipolar and major depression status: Probable Recurrent major depression (severe) || id:ukb-d-20126_3 Anhedonia MR Egger 53 -0.005238863129052902 0.0025064590009345974 0.041609297048701324 -0.010151522770884713 -3.2620348722109133e-4 0.9947748357817099 0.9898998300198217 0.9996738497113518 default 5e-5 158 | yLwDJh ukb-d-20126_3 Bipolar and major depression status: Probable Recurrent major depression (severe) || id:ukb-d-20126_3 Anhedonia Weighted median 53 -6.013103375517248e-4 0.001320760508497343 0.6489108120186604 -0.003190000934206517 0.0019873802591030675 0.9993988704132784 0.9968150817127877 1.0019893564081532 default 5e-5 159 | yLwDJh ukb-d-20126_3 Bipolar and major depression status: Probable Recurrent major depression (severe) || id:ukb-d-20126_3 Anhedonia Inverse variance weighted 53 -1.7907593643432925e-4 0.0010172541782512011 0.8602636676951738 -0.0021728941258066835 0.001814742252938025 0.9998209400967041 0.9978294648996874 1.001816389894191 default 5e-5 160 | yLwDJh ukb-d-20126_3 Bipolar and major depression status: Probable Recurrent major depression (severe) || id:ukb-d-20126_3 Anhedonia Simple mode 53 -7.21413005608379e-5 0.0028692424614030813 0.9800371603477032 -0.005695856524910877 0.005551573923789201 0.9999278613015602 0.9943203341114328 1.0055670124664866 default 5e-5 161 | yLwDJh ukb-d-20126_3 Bipolar and major depression status: Probable Recurrent major depression (severe) || id:ukb-d-20126_3 Anhedonia Weighted mode 53 -8.312417786100236e-4 0.0025507762336947843 0.7458244951112327 -0.005830763196651801 0.004168279639431754 0.999169103607131 0.9941862027123273 1.0041769789999306 default 5e-5 162 | yLwDJh ukb-d-20536_1 Weight change during worst episode of depression: Gained weight || id:ukb-d-20536_1 Anhedonia MR Egger 53 0.007874088568277518 0.004172371022632235 0.06483129245649225 -3.037586360816625e-4 0.0160519357726367 1.0079051707313433 0.9996962874939019 1.0161814602049077 default 5e-5 163 | yLwDJh ukb-d-20536_1 Weight change during worst episode of depression: Gained weight || id:ukb-d-20536_1 Anhedonia Weighted median 53 0.002311299270332095 0.002238824865035889 0.3018980579058252 -0.002076797465138248 0.006699396005802438 1.0023139723815473 0.9979253575865905 1.0067218871568804 default 5e-5 164 | yLwDJh ukb-d-20536_1 Weight change during worst episode of depression: Gained weight || id:ukb-d-20536_1 Anhedonia Inverse variance weighted 53 0.0024824118818810702 0.0016314567851622864 0.12811129887229042 -7.152434170370112e-4 0.005680067180799152 1.0024854956174294 0.9992850123085635 1.0056962293486313 default 5e-5 165 | yLwDJh ukb-d-20536_1 Weight change during worst episode of depression: Gained weight || id:ukb-d-20536_1 Anhedonia Simple mode 53 0.002078553530335099 0.005040047717262209 0.6817361197780075 -0.00779993999549883 0.011957047056169028 1.0020807152201943 0.9922304006002776 1.012028818315502 default 5e-5 166 | yLwDJh ukb-d-20536_1 Weight change during worst episode of depression: Gained weight || id:ukb-d-20536_1 Anhedonia Weighted mode 53 0.0016538018238173094 0.0049192191434639645 0.7380790141363196 -0.00798786769737206 0.011295471345006679 1.00165517010824 0.9920439505414783 1.0113595060550875 default 5e-5 167 | yLwDJh ukb-d-20446 Ever had prolonged feelings of sadness or depression || id:ukb-d-20446 Anhedonia MR Egger 53 -0.0019544886173212504 0.0037588046593766814 0.6053300563686305 -0.009321745749699545 0.005412768515057045 0.998047420151798 0.990721567034144 1.0054274440129658 default 5e-5 168 | yLwDJh ukb-d-20446 Ever had prolonged feelings of sadness or depression || id:ukb-d-20446 Anhedonia Weighted median 53 0.005355887514472155 0.002129054911500236 0.011882410625573511 0.0011829398879316926 0.009528835141012618 1.0053702559204083 1.001183639837293 1.0095743790357299 default 5e-5 169 | yLwDJh ukb-d-20446 Ever had prolonged feelings of sadness or depression || id:ukb-d-20446 Anhedonia Inverse variance weighted 53 0.003869819614170491 0.0014708442233072375 0.008512918858702477 9.869649364883056e-4 0.006752674291852676 1.003877317034195 1.0009874521466544 1.0067755250024109 default 5e-5 170 | yLwDJh ukb-d-20446 Ever had prolonged feelings of sadness or depression || id:ukb-d-20446 Anhedonia Simple mode 53 0.007501817421852637 0.005199623073934276 0.15508453074116121 -0.002689443803058543 0.017693078646763817 1.0075300265499574 0.9973141695109322 1.0178505283822006 default 5e-5 171 | yLwDJh ukb-d-20446 Ever had prolonged feelings of sadness or depression || id:ukb-d-20446 Anhedonia Weighted mode 53 0.007219292186188164 0.005086410074442095 0.16176993449893506 -0.0027500715597183426 0.01718865593209467 1.0072454140987606 0.9972537064230389 1.0173372309258786 default 5e-5 172 | yLwDJh ieu-a-805 Major depressive disorder || id:ieu-a-805 Anhedonia MR Egger 23 0.08414519676406197 0.1022971692179307 0.42000273658790455 -0.1163572549030822 0.28464764843120616 1.0877868254700132 0.8901571534772608 1.3292935669211088 default 5e-5 173 | yLwDJh ieu-a-805 Major depressive disorder || id:ieu-a-805 Anhedonia Weighted median 23 0.07087198383245563 0.03745585683759586 0.058471409431638276 -0.0025414955692322633 0.14428546323414354 1.073443798910898 0.9974617312963648 1.1552138325373966 default 5e-5 174 | yLwDJh ieu-a-805 Major depressive disorder || id:ieu-a-805 Anhedonia Inverse variance weighted 23 0.027076556367316484 0.02878594083724196 0.34690097000622805 -0.02934388767367775 0.08349700040831072 1.027446457321082 0.9710824637511232 1.0870819544859907 default 5e-5 175 | yLwDJh ieu-a-805 Major depressive disorder || id:ieu-a-805 Anhedonia Simple mode 23 0.13160832350254897 0.07964257583236697 0.11263725472585968 -0.02449112512889029 0.28770777213398824 1.1406614614750925 0.9758063490355543 1.333367600016596 default 5e-5 176 | yLwDJh ieu-a-805 Major depressive disorder || id:ieu-a-805 Anhedonia Weighted mode 23 0.12677625691851496 0.07898245093920783 0.12272772864764796 -0.028029346922332388 0.2815818607593623 1.1351630044970746 0.9723598306140961 1.3252244757632679 default 5e-5 177 | yLwDJh ukb-d-20445 Depression possibly related to childbirth || id:ukb-d-20445 Anhedonia MR Egger 53 0.005931336444044538 0.00453081282169199 0.1963646397574995 -0.0029490566864717616 0.014811729574560837 1.0059489616498283 0.997055287509722 1.0149219668367695 default 5e-5 178 | yLwDJh ukb-d-20445 Depression possibly related to childbirth || id:ukb-d-20445 Anhedonia Weighted median 53 0.0035335306867723 0.0025052898234880507 0.15841336937912517 -0.001376837367264279 0.00844389874080888 1.0035397809660123 0.998624110038446 1.0084796490068122 default 5e-5 179 | yLwDJh ukb-d-20445 Depression possibly related to childbirth || id:ukb-d-20445 Anhedonia Inverse variance weighted 53 0.003616491071684504 0.0017732136852317672 0.04139892771181308 1.4099224863024047e-4 0.007091989894738767 1.0036230384660054 1.0001410021885044 1.0071171976107933 default 5e-5 180 | yLwDJh ukb-d-20445 Depression possibly related to childbirth || id:ukb-d-20445 Anhedonia Simple mode 53 0.0024756460648981266 0.005246255787546663 0.6389808104471137 -0.007807015278693333 0.012758307408489586 1.002478713006983 0.9922233803140345 1.012840041840246 default 5e-5 181 | yLwDJh ukb-d-20445 Depression possibly related to childbirth || id:ukb-d-20445 Anhedonia Weighted mode 53 0.002992185487019801 0.0055772810115374315 0.5939041495445666 -0.007939285295593564 0.013923656269633166 1.0029966665422823 0.9920921475900201 1.0140210418343707 default 5e-5 182 | yLwDJh ukb-d-20447 Depression possibly related to stressful or traumatic event || id:ukb-d-20447 Anhedonia MR Egger 53 0.003200045693363219 0.004500277994262776 0.4802759527662146 -0.00562049917539182 0.01202059056211826 1.0032051713055223 0.9943952662796937 1.0120931282179562 default 5e-5 183 | yLwDJh ukb-d-20447 Depression possibly related to stressful or traumatic event || id:ukb-d-20447 Anhedonia Weighted median 53 -0.00305433369971698 0.002455386629583959 0.21352463596543234 -0.007866891493701539 0.00175822409426758 0.9969503260321251 0.9921639715121834 1.0017597706765302 default 5e-5 184 | yLwDJh ukb-d-20447 Depression possibly related to stressful or traumatic event || id:ukb-d-20447 Anhedonia Inverse variance weighted 53 -6.690331265097769e-4 0.00175970128854372 0.7037991962435275 -0.004118047652055468 0.002779981399035914 0.9993311906262503 0.9958904198789571 1.002783849130569 default 5e-5 185 | yLwDJh ukb-d-20447 Depression possibly related to stressful or traumatic event || id:ukb-d-20447 Anhedonia Simple mode 53 -0.004586280363513738 0.005377254283956923 0.3976242634421887 -0.015125698760069306 0.00595313803304183 0.9954242205607449 0.9849881200358711 1.0059708931747127 default 5e-5 186 | yLwDJh ukb-d-20447 Depression possibly related to stressful or traumatic event || id:ukb-d-20447 Anhedonia Weighted mode 53 -0.004424088971243235 0.004969936287810045 0.37747456406078006 -0.014165164095350923 0.005316986152864453 0.9955856828945238 0.9859346898032609 1.0053311464092445 default 5e-5 187 | yLwDJh ukb-b-6848 Ever depressed for a whole week || id:ukb-b-6848 Anhedonia MR Egger 53 1.6630524286892167e-4 0.0038137880734109434 0.9653885038532117 -0.007308719381016527 0.00764132986675437 1.0001663190723524 0.9927179243584253 1.0076705993328716 default 5e-5 188 | yLwDJh ukb-b-6848 Ever depressed for a whole week || id:ukb-b-6848 Anhedonia Weighted median 53 8.747150620199433e-4 0.0019523245809458167 0.654125971263704 -0.0029518411166338573 0.004701271240673744 1.0008750977368088 0.9970525112827713 1.004712339554564 default 5e-5 189 | yLwDJh ukb-b-6848 Ever depressed for a whole week || id:ukb-b-6848 Anhedonia Inverse variance weighted 53 0.0018110416058394454 0.0014825563828576493 0.22187150291587193 -0.0010947689045615473 0.004716852116240438 1.0018126825321343 0.998905830136292 1.0047279939744616 default 5e-5 190 | yLwDJh ukb-b-6848 Ever depressed for a whole week || id:ukb-b-6848 Anhedonia Simple mode 53 -3.941698733130189e-4 0.004003898264450722 0.9219562480683037 -0.008241810471636435 0.0074534707250103974 0.9996059078014254 0.9917920601327138 1.0074813169786874 default 5e-5 191 | yLwDJh ukb-b-6848 Ever depressed for a whole week || id:ukb-b-6848 Anhedonia Weighted mode 53 -3.941698733130189e-4 0.0037375844169934575 0.9164156819870084 -0.007719835330620196 0.006931495583994158 0.9996059078014254 0.9923098860675359 1.0069555740005056 default 5e-5 192 | yLwDJh ukb-a-246 Seen doctor (GP) for nerves anxiety tension or depression || id:ukb-a-246 Anhedonia MR Egger 53 0.00206028412016329 0.002363740590143736 0.38750042307853094 -0.0025726474365184325 0.006693215676845012 1.0020624079638145 0.9974306589848713 1.0067156653036755 default 5e-5 193 | yLwDJh ukb-a-246 Seen doctor (GP) for nerves anxiety tension or depression || id:ukb-a-246 Anhedonia Weighted median 53 0.0019121985050957395 0.0012410081826949061 0.12335505345453311 -5.201775329862763e-4 0.004344574543177755 1.0019140279225411 0.999479957735891 1.0043540258895611 default 5e-5 194 | yLwDJh ukb-a-246 Seen doctor (GP) for nerves anxiety tension or depression || id:ukb-a-246 Anhedonia Inverse variance weighted 53 5.155051874028247e-4 9.208385177466155e-4 0.5756012066560054 -0.0012893383073805417 0.002320348682186191 1.0005156380830371 0.9987114925321388 1.002323042774531 default 5e-5 195 | yLwDJh ukb-a-246 Seen doctor (GP) for nerves anxiety tension or depression || id:ukb-a-246 Anhedonia Simple mode 53 0.004216668021042088 0.002846565866093616 0.1445565197225679 -0.0013626010765013996 0.009795937118585576 1.0042255706744216 0.9986383268428363 1.0098440743653518 default 5e-5 196 | yLwDJh ukb-a-246 Seen doctor (GP) for nerves anxiety tension or depression || id:ukb-a-246 Anhedonia Weighted mode 53 0.0036363948794926916 0.002902354841455342 0.21584276695204477 -0.0020522206097597787 0.009325010368745161 1.0036430145848747 0.9979498837551692 1.0093686237375616 default 5e-5 197 | yLwDJh ebi-a-GCST009981 Major depressive disorder in trauma-unexposed individuals || id:ebi-a-GCST009981 Anhedonia MR Egger 51 -0.01152584614678672 0.023030076354849847 0.618985190971232 -0.056664795802292424 0.03361310350871898 0.9885403219594602 0.9449107543378052 1.0341844069967694 default 5e-5 198 | yLwDJh ebi-a-GCST009981 Major depressive disorder in trauma-unexposed individuals || id:ebi-a-GCST009981 Anhedonia Weighted median 51 0.0130632689574616 0.014532662758018759 0.3687111182262254 -0.015420750048255166 0.041547287963178366 1.0131489662108994 0.9846975408921902 1.0424224547206398 default 5e-5 199 | yLwDJh ebi-a-GCST009981 Major depressive disorder in trauma-unexposed individuals || id:ebi-a-GCST009981 Anhedonia Inverse variance weighted 51 0.025738560638941595 0.010185712309002583 0.011506512150623748 0.005774564513296533 0.045702556764586656 1.0260726576240675 1.0057912694500548 1.0467630120704656 default 5e-5 200 | yLwDJh ebi-a-GCST009981 Major depressive disorder in trauma-unexposed individuals || id:ebi-a-GCST009981 Anhedonia Simple mode 51 0.02867832432924322 0.025263925313579023 0.26172522814888693 -0.020838969285371663 0.0781956179438581 1.0290935068824762 0.9793766615957935 1.0813341663483047 default 5e-5 201 | yLwDJh ebi-a-GCST009981 Major depressive disorder in trauma-unexposed individuals || id:ebi-a-GCST009981 Anhedonia Weighted mode 51 0.01897861500159037 0.01705804894247882 0.27120525102458143 -0.014455160925668113 0.052412390928848855 1.0191598536525166 0.9856488133219584 1.0538102346984068 default 5e-5 202 | yLwDJh ebi-a-GCST90016615 Major depressive disorder vs obsessive compulsive disorder (ordinary least squares (OLS)) || id:ebi-a-GCST90016615 Anhedonia MR Egger 50 0.001388721588623169 0.0021868437427916367 0.5284214801602047 -0.002897492147248439 0.005674935324494777 1.0013896863089728 0.9971067015317614 1.0056910682733395 default 5e-5 203 | yLwDJh ebi-a-GCST90016615 Major depressive disorder vs obsessive compulsive disorder (ordinary least squares (OLS)) || id:ebi-a-GCST90016615 Anhedonia Weighted median 50 2.68262150868002e-4 0.0013352650098660528 0.8407724281203874 -0.0023488572684694613 0.0028853815702054655 1.0002682981363766 0.9976538991382067 1.00288954829017 default 5e-5 204 | yLwDJh ebi-a-GCST90016615 Major depressive disorder vs obsessive compulsive disorder (ordinary least squares (OLS)) || id:ebi-a-GCST90016615 Anhedonia Inverse variance weighted 50 8.571036597513429e-4 9.179250388075396e-4 0.3504378384940338 -9.420294163114348e-4 0.0026562367358141208 1.0008574710780576 0.9990584141541028 1.0026597676582423 default 5e-5 205 | yLwDJh ebi-a-GCST90016615 Major depressive disorder vs obsessive compulsive disorder (ordinary least squares (OLS)) || id:ebi-a-GCST90016615 Anhedonia Simple mode 50 8.460366818745721e-4 0.0023964383382948143 0.7255733224511438 -0.0038509824611832636 0.005543055824932408 1.0008463946718587 0.9961564230625444 1.0055584469837482 default 5e-5 206 | yLwDJh ebi-a-GCST90016615 Major depressive disorder vs obsessive compulsive disorder (ordinary least squares (OLS)) || id:ebi-a-GCST90016615 Anhedonia Weighted mode 50 1.038043667631397e-4 0.0016012498385390324 0.9485754323039668 -0.003034645316773364 0.0032422540502996433 1.0001038097546229 0.9969699545651461 1.0032475158411136 default 5e-5 207 | yLwDJh ukb-b-12064 Non-cancer illness code, self-reported: depression || id:ukb-b-12064 Anhedonia MR Egger 52 -7.380761476837767e-4 9.066011531930923e-4 0.41944044257060675 -0.0025150144079422376 0.0010388621125746842 0.9992621961635165 0.997488145591091 1.0010394019167304 default 5e-5 208 | yLwDJh ukb-b-12064 Non-cancer illness code, self-reported: depression || id:ukb-b-12064 Anhedonia Weighted median 52 6.529189857467151e-4 4.835228105701271e-4 0.17690774711323876 -2.9478572297073394e-4 0.0016006236944641641 1.0006531321837455 0.9997052577220714 1.0016019053763088 default 5e-5 209 | yLwDJh ukb-b-12064 Non-cancer illness code, self-reported: depression || id:ukb-b-12064 Anhedonia Inverse variance weighted 52 4.934212156760057e-5 3.5432357695211827e-4 0.8892468821814017 -6.451320892585513e-4 7.438163323937524e-4 1.0000493433389102 0.9993550759637048 1.0007440930323623 default 5e-5 210 | yLwDJh ukb-b-12064 Non-cancer illness code, self-reported: depression || id:ukb-b-12064 Anhedonia Simple mode 52 9.003345820433502e-4 0.001088269052190236 0.4119164019311333 -0.0012326727602495124 0.0030333419243362128 1.0009007400048862 0.9987680866687428 1.0030379471611932 default 5e-5 211 | yLwDJh ukb-b-12064 Non-cancer illness code, self-reported: depression || id:ukb-b-12064 Anhedonia Weighted mode 52 9.61575813890567e-4 0.0010141543755401257 0.3475217322296853 -0.0010261667621680793 0.0029493183899492134 1.0009620382761324 0.9989743595668946 1.0029536719083503 default 5e-5 212 | yLwDJh ebi-a-GCST009984 Trauma exposure in major depressive disorder-negative individuals || id:ebi-a-GCST009984 Anhedonia MR Egger 51 0.002445391498523234 0.021905423759728607 0.9115696048657242 -0.04048923907054483 0.0453800220675913 1.00244838390702 0.9603194983861884 1.0464254491203497 default 5e-5 213 | yLwDJh ebi-a-GCST009984 Trauma exposure in major depressive disorder-negative individuals || id:ebi-a-GCST009984 Anhedonia Weighted median 51 0.0051600538682416855 0.013077397515548362 0.6931543234268145 -0.020471645262233103 0.030791752998716473 1.0051733898745066 0.9797364762515366 1.0312707224880382 default 5e-5 214 | yLwDJh ebi-a-GCST009984 Trauma exposure in major depressive disorder-negative individuals || id:ebi-a-GCST009984 Anhedonia Inverse variance weighted 51 0.014525660962244663 0.009419991761055348 0.12307272510690234 -0.00393752288942382 0.03298884481391315 1.0146316710423444 0.9960702189892204 1.0335390098570163 default 5e-5 215 | yLwDJh ebi-a-GCST009984 Trauma exposure in major depressive disorder-negative individuals || id:ebi-a-GCST009984 Anhedonia Simple mode 51 0.006167680915254381 0.021442351186382682 0.774811081220934 -0.03585932741005567 0.048194689240564435 1.0061867402229523 0.9647760014765456 1.0493749374476986 default 5e-5 216 | yLwDJh ebi-a-GCST009984 Trauma exposure in major depressive disorder-negative individuals || id:ebi-a-GCST009984 Anhedonia Weighted mode 51 0.010277615081492053 0.017097019661548574 0.5504658433700567 -0.023232543455143154 0.04378777361812726 1.010330611169567 0.9770352542001176 1.0447606055955023 default 5e-5 217 | yLwDJh finn-b-F5_DEPRESSIO Depression || id:finn-b-F5_DEPRESSIO Anhedonia MR Egger 50 -0.0043240968666020336 0.022796265453181155 0.8503562821854096 -0.049004777154837094 0.04035658342163303 0.9956852385796153 0.9521765809926803 1.0411819762378367 default 5e-5 218 | yLwDJh finn-b-F5_DEPRESSIO Depression || id:finn-b-F5_DEPRESSIO Anhedonia Weighted median 50 0.0015600779184253581 0.01175238836138265 0.8943945733994612 -0.021474603269884637 0.02459475910673535 1.0015612954730588 0.9787543343131828 1.0248997050864563 default 5e-5 219 | yLwDJh finn-b-F5_DEPRESSIO Depression || id:finn-b-F5_DEPRESSIO Anhedonia Inverse variance weighted 50 0.006229214438650065 0.008320098294015824 0.45404117055845483 -0.01007817821762095 0.022536607094921078 1.0062486563432111 0.9899724364432407 1.0227924749403574 default 5e-5 220 | yLwDJh finn-b-F5_DEPRESSIO Depression || id:finn-b-F5_DEPRESSIO Anhedonia Simple mode 50 0.003390248883287761 0.027251775784691772 0.9015038121522727 -0.05002323165470811 0.05680372942128363 1.0033960022770079 0.9512073261238677 1.058448047796442 default 5e-5 221 | yLwDJh finn-b-F5_DEPRESSIO Depression || id:finn-b-F5_DEPRESSIO Anhedonia Weighted mode 50 -3.082428859472186e-4 0.024461048228125105 0.9899969901395904 -0.048251897413072425 0.04763541164117799 0.9996918046160103 0.9528937253789578 1.0487882096389802 default 5e-5 222 | yLwDJh ieu-a-804 Major depressive disorder || id:ieu-a-804 Anhedonia MR Egger 5 0.008926153141985428 0.3104794447495534 0.9788699164095929 -0.5996135585671393 0.6174658648511101 1.008966110045603 0.5490237606332649 1.8542232307875741 default 5e-5 223 | yLwDJh ieu-a-804 Major depressive disorder || id:ieu-a-804 Anhedonia Weighted median 5 0.03288806387952133 0.06607421954360072 0.61866430391613 -0.09661740642593608 0.16239353418497876 1.033434854078419 0.9079032976608394 1.1763230735869028 default 5e-5 224 | yLwDJh ieu-a-804 Major depressive disorder || id:ieu-a-804 Anhedonia Inverse variance weighted 5 0.038651338950178186 0.06575296489918193 0.5566487167804739 -0.09022447225221839 0.16752715015257477 1.039408019374014 0.9137260561034622 1.1823773914757219 default 5e-5 225 | yLwDJh ieu-a-804 Major depressive disorder || id:ieu-a-804 Anhedonia Simple mode 5 0.13606651112263124 0.11610380214010158 0.30626058925615685 -0.09149694107196785 0.3636299633172303 1.1457580967179326 0.9125641076156716 1.4385418024215915 default 5e-5 226 | yLwDJh ieu-a-804 Major depressive disorder || id:ieu-a-804 Anhedonia Weighted mode 5 -0.0440951370341206 0.11635652762857045 0.7239709192877879 -0.27215393118611864 0.18396365711787746 0.956862920042327 0.7617369969853114 1.2019721391707379 default 5e-5 227 | yLwDJh ebi-a-GCST90016612 Major depressive disorder vs ADHD (ordinary least squares (OLS)) || id:ebi-a-GCST90016612 Anhedonia MR Egger 42 -0.00456406668307722 0.002107809197034264 0.03638466411521643 -0.008695372709264376 -4.327606568900631e-4 0.9954463328418758 0.991342322706325 0.9995673329704965 default 5e-5 228 | yLwDJh ebi-a-GCST90016612 Major depressive disorder vs ADHD (ordinary least squares (OLS)) || id:ebi-a-GCST90016612 Anhedonia Weighted median 42 -0.001214100919417638 0.0013465961516086033 0.3672655121905588 -0.0038534293765705003 0.0014252275377352242 0.9987866358029217 0.9961539855550469 1.0014262436571788 default 5e-5 229 | yLwDJh ebi-a-GCST90016612 Major depressive disorder vs ADHD (ordinary least squares (OLS)) || id:ebi-a-GCST90016612 Anhedonia Inverse variance weighted 42 -3.318381888741228e-4 9.561869659203929e-4 0.728558860860093 -0.002205964642078093 0.0015422882643298472 0.9996682168633281 0.997796466709769 1.001543478202539 default 5e-5 230 | yLwDJh ebi-a-GCST90016612 Major depressive disorder vs ADHD (ordinary least squares (OLS)) || id:ebi-a-GCST90016612 Anhedonia Simple mode 42 0.0020631818781770006 0.0024270743693460416 0.40022341567115216 -0.002693883885741241 0.006820247642095242 1.0020653117023945 0.9973097413633896 1.006843558496177 default 5e-5 231 | yLwDJh ebi-a-GCST90016612 Major depressive disorder vs ADHD (ordinary least squares (OLS)) || id:ebi-a-GCST90016612 Anhedonia Weighted mode 42 -0.0013418308556955583 0.0016538996583122072 0.4218708309732707 -0.004583474185987485 0.0018998124745963677 0.9986590689967988 0.9954270139017409 1.0019016182616869 default 5e-5 232 | yLwDJh ukb-a-373 Ever depressed for a whole week || id:ukb-a-373 Anhedonia MR Egger 53 -6.017915883468887e-4 0.0041744036580448765 0.8859404843362795 -0.008783622758114847 0.007580039581421069 0.9993983894518931 0.9912548405581274 1.0076088408069348 default 5e-5 233 | yLwDJh ukb-a-373 Ever depressed for a whole week || id:ukb-a-373 Anhedonia Weighted median 53 -5.588722651238252e-4 0.002205683367801206 0.7999759076874855 -0.004882011666014189 0.0037642671357665386 0.9994412838748917 0.995129885983577 1.003771360887434 default 5e-5 234 | yLwDJh ukb-a-373 Ever depressed for a whole week || id:ukb-a-373 Anhedonia Inverse variance weighted 53 0.001662482758954975 0.0016249464595722361 0.30626055643661937 -0.0015224123018066078 0.0048473778197165585 1.0016638654495438 0.998478745979933 1.0048591453618045 default 5e-5 235 | yLwDJh ukb-a-373 Ever depressed for a whole week || id:ukb-a-373 Anhedonia Simple mode 53 -0.002973614182142703 0.004852226180735038 0.5426564925830246 -0.012483977496383377 0.006536749132097971 0.9970308026294602 0.987593624089528 1.0065581603044356 default 5e-5 236 | yLwDJh ukb-a-373 Ever depressed for a whole week || id:ukb-a-373 Anhedonia Weighted mode 53 -0.0023942454081117073 0.0048680105745177405 0.6249077099396196 -0.011935546134166478 0.007147055317943064 0.9976086185113274 0.9881353999559629 1.0071726564724148 default 5e-5 237 | yLwDJh ukb-d-20536_2 Weight change during worst episode of depression: Lost weight || id:ukb-d-20536_2 Anhedonia MR Egger 53 0.0091633561094555 0.005274817018303147 0.0883902656223034 -0.00117528524641867 0.01950199746532967 1.0092054681880913 0.9988254051307967 1.019693403660845 default 5e-5 238 | yLwDJh ukb-d-20536_2 Weight change during worst episode of depression: Lost weight || id:ukb-d-20536_2 Anhedonia Weighted median 53 0.0026906777527750596 0.003037677083890803 0.37574245081954266 -0.0032631693316509144 0.008644524837201033 1.0026943008749825 0.996742149018927 1.0086819966395124 default 5e-5 239 | yLwDJh ukb-d-20536_2 Weight change during worst episode of depression: Lost weight || id:ukb-d-20536_2 Anhedonia Inverse variance weighted 53 0.0021780516517909366 0.0020625327253763785 0.2909644284576183 -0.001864512489946765 0.006220615793528638 1.0021804253293078 0.9981372246336685 1.0062400040053106 default 5e-5 240 | yLwDJh ukb-d-20536_2 Weight change during worst episode of depression: Lost weight || id:ukb-d-20536_2 Anhedonia Simple mode 53 0.007130940910551595 0.007361634302780736 0.33719749250471076 -0.0072978623228986475 0.021559744144001837 1.0071564266126827 0.9927287024131336 1.0217938347118432 default 5e-5 241 | yLwDJh ukb-d-20536_2 Weight change during worst episode of depression: Lost weight || id:ukb-d-20536_2 Anhedonia Weighted mode 53 0.0075494353393921396 0.0064548207087149565 0.2475027703779272 -0.005102013249689175 0.020200883928473454 1.0075780041739684 0.9949109799134223 1.0204063026659351 default 5e-5 242 | yLwDJh ukb-b-10807 Illnesses of mother: Severe depression || id:ukb-b-10807 Anhedonia MR Egger 52 -7.972947398275306e-4 0.00101925426086379 0.43776632752041733 -0.0027950330911205587 0.0012004436114654978 0.9992030230151698 0.9972088693771803 1.0012011644323038 default 5e-5 243 | yLwDJh ukb-b-10807 Illnesses of mother: Severe depression || id:ukb-b-10807 Anhedonia Weighted median 52 3.1574379075771696e-4 5.829199987072315e-4 0.5880535252299577 -8.267794067084568e-4 0.0014582669882238907 1.000315793643075 0.9991735622812119 1.0014593307765614 default 5e-5 244 | yLwDJh ukb-b-10807 Illnesses of mother: Severe depression || id:ukb-b-10807 Anhedonia Inverse variance weighted 52 3.105714409341143e-4 3.984145312103437e-4 0.4356744280983179 -4.703210402381593e-4 0.001091463922106388 1.0003106196732372 0.999529789543365 1.0010920597856212 default 5e-5 245 | yLwDJh ukb-b-10807 Illnesses of mother: Severe depression || id:ukb-b-10807 Anhedonia Simple mode 52 3.168155464185248e-4 0.0013947918674168294 0.821221546276252 -0.002416976513718461 0.0030506076065555106 1.0003168657377641 0.9975859420221977 1.0030552654451483 default 5e-5 246 | yLwDJh ukb-b-10807 Illnesses of mother: Severe depression || id:ukb-b-10807 Anhedonia Weighted mode 52 3.058228013737285e-5 0.0012658296684969629 0.9808193721563858 -0.0024504438701166745 0.0025116084303914202 1.00003058274778 0.997552556016612 1.002514765161116 default 5e-5 247 | yLwDJh ebi-a-GCST90016614 Major depressive disorder vs autism spectrum disorder (ordinary least squares (OLS)) || id:ebi-a-GCST90016614 Anhedonia MR Egger 48 0.0011412134556277806 0.001645380199382928 0.4914292333487801 -0.0020837317351627585 0.00436615864641832 1.0011418648874875 0.9979184377266889 1.0043757042044985 default 5e-5 248 | yLwDJh ebi-a-GCST90016614 Major depressive disorder vs autism spectrum disorder (ordinary least squares (OLS)) || id:ebi-a-GCST90016614 Anhedonia Weighted median 48 2.486622227432824e-4 0.0010476954715774084 0.8123914191926999 -0.0018048209015484378 0.0023021453470350025 1.0002486931417565 0.998196806808306 1.0023047973183183 default 5e-5 249 | yLwDJh ebi-a-GCST90016614 Major depressive disorder vs autism spectrum disorder (ordinary least squares (OLS)) || id:ebi-a-GCST90016614 Anhedonia Inverse variance weighted 48 -1.0295843336911844e-5 7.027311790848902e-4 0.9883104652315874 -0.0013876489543432967 0.001367057267669473 0.9999897042096652 0.9986133133852856 1.0013679921164047 default 5e-5 250 | yLwDJh ebi-a-GCST90016614 Major depressive disorder vs autism spectrum disorder (ordinary least squares (OLS)) || id:ebi-a-GCST90016614 Anhedonia Simple mode 48 -2.9308061633722543e-4 0.0017172523842620662 0.8652171607482485 -0.0036588952894908754 0.0030727340568164245 0.9997069623275912 0.9963477903114221 1.0030774597431278 default 5e-5 251 | yLwDJh ebi-a-GCST90016614 Major depressive disorder vs autism spectrum disorder (ordinary least squares (OLS)) || id:ebi-a-GCST90016614 Anhedonia Weighted mode 48 -2.8995889569123634e-5 0.0012136546599871548 0.9810403954436817 -0.002407759023143947 0.0023497672440056998 0.9999710045308077 0.9975951373035942 1.0023525301106635 default 5e-5 252 | yLwDJh ukb-d-20126_0 Bipolar and major depression status: No Bipolar or Depression || id:ukb-d-20126_0 Anhedonia MR Egger 53 1.3519632426406923e-4 0.004404591657361662 0.9756330591871418 -0.008497803324164787 0.008768195972692926 1.000135205463699 0.9915382009485801 1.0088067492013735 default 5e-5 253 | yLwDJh ukb-d-20126_0 Bipolar and major depression status: No Bipolar or Depression || id:ukb-d-20126_0 Anhedonia Weighted median 53 -0.003865657150394822 0.002262558635067301 0.0875374019061627 -0.008300272075126732 5.689577743370881e-4 0.9961418048838887 0.9917340800733696 1.0005691196615125 default 5e-5 254 | yLwDJh ukb-d-20126_0 Bipolar and major depression status: No Bipolar or Depression || id:ukb-d-20126_0 Anhedonia Inverse variance weighted 53 -0.001422017342842227 0.0017112567991119675 0.405985862786562 -0.004776080669101684 0.0019320459834172295 0.9985789932447383 0.9952353066680172 1.0019339135868297 default 5e-5 255 | yLwDJh ukb-d-20126_0 Bipolar and major depression status: No Bipolar or Depression || id:ukb-d-20126_0 Anhedonia Simple mode 53 -0.007229416309426938 0.005464449038603061 0.1916268537991728 -0.017939736425088938 0.003480903806235062 0.9927966530607216 0.9822202226767411 1.0034869691875168 default 5e-5 256 | yLwDJh ukb-d-20126_0 Bipolar and major depression status: No Bipolar or Depression || id:ukb-d-20126_0 Anhedonia Weighted mode 53 -0.005976474475300614 0.004671367220817169 0.20644108980716724 -0.015132354228102265 0.0031794052775010375 0.9940413491231722 0.9849815645007405 1.0031844649472863 default 5e-5 257 | yLwDJh ukb-b-6991 Seen doctor (GP) for nerves, anxiety, tension or depression || id:ukb-b-6991 Anhedonia MR Egger 53 6.494411833324998e-4 0.0020347926793322845 0.7509025945387702 -0.0033387524681587778 0.004637634834823778 1.000649652115918 0.9966668149680423 1.0046484053066562 default 5e-5 258 | yLwDJh ukb-b-6991 Seen doctor (GP) for nerves, anxiety, tension or depression || id:ukb-b-6991 Anhedonia Weighted median 53 3.7176747022504456e-4 0.0010750992634523716 0.7294943219987287 -0.0017354270861416037 0.0024789620265916927 1.0003718365843155 0.9982660778967222 1.0024820371935053 default 5e-5 259 | yLwDJh ukb-b-6991 Seen doctor (GP) for nerves, anxiety, tension or depression || id:ukb-b-6991 Anhedonia Inverse variance weighted 53 2.2020756754995407e-4 7.895080903974733e-4 0.7803081919342145 -0.0013272282896290937 0.001767643424729002 1.0002202318150162 0.9986736520883067 1.0017692066272934 default 5e-5 260 | yLwDJh ukb-b-6991 Seen doctor (GP) for nerves, anxiety, tension or depression || id:ukb-b-6991 Anhedonia Simple mode 53 0.0014531691659962626 0.0027666777352572465 0.6016490309839972 -0.0039695191951079406 0.006875857527100466 1.0014542255279377 0.9960383489318756 1.0068995505075236 default 5e-5 261 | yLwDJh ukb-b-6991 Seen doctor (GP) for nerves, anxiety, tension or depression || id:ukb-b-6991 Anhedonia Weighted mode 53 0.0016752426440065048 0.0024517903361622436 0.4974674749918543 -0.0031302664148714927 0.006480751702884502 1.0016766466468703 0.9968746277610192 1.0065017972132135 default 5e-5 262 | yLwDJh ukb-d-20546_4 Substances taken for depression: Drugs or alcohol (more than once) || id:ukb-d-20546_4 Anhedonia MR Egger 53 0.0010668923838099368 0.0021968114017901245 0.629291830529247 -0.003238857963698707 0.005372642731318581 1.0010674617159432 0.9967663814786262 1.0053871012581803 default 5e-5 263 | yLwDJh ukb-d-20546_4 Substances taken for depression: Drugs or alcohol (more than once) || id:ukb-d-20546_4 Anhedonia Weighted median 53 9.053061049969176e-4 0.0011096442983979224 0.4145844866101146 -0.0012695967198630104 0.0030802089298568457 1.0009057160182584 0.9987312088770888 1.003084957647812 default 5e-5 264 | yLwDJh ukb-d-20546_4 Substances taken for depression: Drugs or alcohol (more than once) || id:ukb-d-20546_4 Anhedonia Inverse variance weighted 53 4.692897713169569e-4 8.520508335431413e-4 0.5817867383119675 -0.0012007298624276002 0.002139309405061514 1.0004693999049892 0.9987999907252344 1.0021415993601097 default 5e-5 265 | yLwDJh ukb-d-20546_4 Substances taken for depression: Drugs or alcohol (more than once) || id:ukb-d-20546_4 Anhedonia Simple mode 53 0.002669963554422238 0.002674979463016137 0.32284098340478695 -0.00257299619308939 0.007912923301933866 1.0026735310814623 0.9974303111244356 1.0079443132202388 default 5e-5 266 | yLwDJh ukb-d-20546_4 Substances taken for depression: Drugs or alcohol (more than once) || id:ukb-d-20546_4 Anhedonia Weighted mode 53 3.2722314280947407e-5 0.0024814381949724773 0.9895291977895888 -0.004830896547865108 0.004896341176427003 1.0000327228496617 0.9951807534653103 1.004908347843132 default 5e-5 267 | yLwDJh ukb-d-20547_1 Activities undertaken to treat depression: Talking therapies, such as psychotherapy, counselling, group therapy or CBT || id:ukb-d-20547_1 Anhedonia MR Egger 53 0.0022818649042721335 0.0031425243773623894 0.4710816880419013 -0.0038774828753581495 0.008441212683902417 1.0022844703393663 0.9961300248545335 1.008476940176724 default 5e-5 268 | yLwDJh ukb-d-20547_1 Activities undertaken to treat depression: Talking therapies, such as psychotherapy, counselling, group therapy or CBT || id:ukb-d-20547_1 Anhedonia Weighted median 53 -9.51951020501519e-4 0.0017796632318964434 0.592715449871172 -0.004440090955018548 0.00253618891401551 0.9990485019411274 0.995569751676045 1.002539407761746 default 5e-5 269 | yLwDJh ukb-d-20547_1 Activities undertaken to treat depression: Talking therapies, such as psychotherapy, counselling, group therapy or CBT || id:ukb-d-20547_1 Anhedonia Inverse variance weighted 53 3.08826222869189e-4 0.0012296901826824487 0.8017047203555047 -0.0021013665351884104 0.0027190189809267887 1.0003088739145964 0.9979008397897662 1.0027227188656285 default 5e-5 270 | yLwDJh ukb-d-20547_1 Activities undertaken to treat depression: Talking therapies, such as psychotherapy, counselling, group therapy or CBT || id:ukb-d-20547_1 Anhedonia Simple mode 53 -0.002039878806169973 0.004200789310482268 0.6292947764067001 -0.010273425854715218 0.006193668242375272 0.9979622003326313 0.9897791655326951 1.0062128886666777 default 5e-5 271 | yLwDJh ukb-d-20547_1 Activities undertaken to treat depression: Talking therapies, such as psychotherapy, counselling, group therapy or CBT || id:ukb-d-20547_1 Anhedonia Weighted mode 53 -0.002268160895772975 0.0040498897163859186 0.577846804106281 -0.010205944739889375 0.0056696229483434255 0.9977344094374745 0.9898459591878463 1.0056857256782836 default 5e-5 272 | yLwDJh ebi-a-GCST005903 Major depressive disorder (ICD-10 coded) || id:ebi-a-GCST005903 Anhedonia MR Egger 50 -0.0014745487220620738 0.0010963094371057539 0.18494229923329375 -0.0036233152187893514 6.742177746652039e-4 0.9985265378907513 0.996383241066911 1.0006744451105574 default 5e-5 273 | yLwDJh ebi-a-GCST005903 Major depressive disorder (ICD-10 coded) || id:ebi-a-GCST005903 Anhedonia Weighted median 50 -4.612005983869663e-5 6.306243363460544e-4 0.9416995117137977 -0.0012821437590769633 0.00118990363939957 0.9999538810036749 0.9987186778360606 1.0011906118556102 default 5e-5 274 | yLwDJh ebi-a-GCST005903 Major depressive disorder (ICD-10 coded) || id:ebi-a-GCST005903 Anhedonia Inverse variance weighted 50 5.813705290458126e-5 4.3413098210260667e-4 0.89346905581009906 -7.927596720165278e-4 9.090337778256904e-4 1.0000581387428957 0.9992075544789114 1.0009094470742543 default 5e-5 275 | yLwDJh ebi-a-GCST005903 Major depressive disorder (ICD-10 coded) || id:ebi-a-GCST005903 Anhedonia Simple mode 50 -4.5813548299802366e-4 0.001373972190882238 0.7402258391063308 -0.00315112097712721 0.002234850011131163 0.999541969445038 0.9968538385938087 1.0022373491498038 default 5e-5 276 | yLwDJh ebi-a-GCST005903 Major depressive disorder (ICD-10 coded) || id:ebi-a-GCST005903 Anhedonia Weighted mode 50 -3.7188931858289295e-4 0.0012553545843733247 0.7682969035840213 -0.002832384303954609 0.0020886056667888233 0.9996281798236784 0.9971716231120611 1.0020907883229093 default 5e-5 277 | yLwDJh ukb-d-20547_3 Activities undertaken to treat depression: Other therapeutic activities such as mindfulness, yoga or art classes || id:ukb-d-20547_3 Anhedonia MR Egger 53 -0.002920463484743794 0.002047733757810892 0.15990559434989934 -0.006934021650053142 0.0010930946805655542 0.9970837969202775 0.9930899632088728 1.0010936923262972 default 5e-5 278 | yLwDJh ukb-d-20547_3 Activities undertaken to treat depression: Other therapeutic activities such as mindfulness, yoga or art classes || id:ukb-d-20547_3 Anhedonia Weighted median 53 -3.369980170202587e-4 0.001145665158352243 0.7686428781822551 -0.0025825017273906547 0.0019085056933501373 0.9996630587604334 0.9974208300614614 1.001910328049482 default 5e-5 279 | yLwDJh ukb-d-20547_3 Activities undertaken to treat depression: Other therapeutic activities such as mindfulness, yoga or art classes || id:ukb-d-20547_3 Anhedonia Inverse variance weighted 53 -1.6789517876517502e-4 8.012923089310797e-4 0.8340341275972927 -0.001738428104270091 0.0014026377467397412 0.9998321189148416 0.9982630820866206 1.0014036219031486 default 5e-5 280 | yLwDJh ukb-d-20547_3 Activities undertaken to treat depression: Other therapeutic activities such as mindfulness, yoga or art classes || id:ukb-d-20547_3 Anhedonia Simple mode 53 -0.002113988455437966 0.002646122412187338 0.4279821107827807 -0.007300388383325148 0.0030724114724492166 0.9978882444444382 0.9927261947236115 1.0030771361660724 default 5e-5 281 | yLwDJh ukb-d-20547_3 Activities undertaken to treat depression: Other therapeutic activities such as mindfulness, yoga or art classes || id:ukb-d-20547_3 Anhedonia Weighted mode 53 -0.0018917100377508003 0.0025203962553501983 0.45630015320574946 -0.0068316866982371886 0.003048266622735588 0.9981100781179476 0.9931915962226228 1.00305291731175 default 5e-5 282 | yLwDJh ukb-b-14918 Illnesses of siblings: Severe depression || id:ukb-b-14918 Anhedonia MR Egger 51 2.9376082798385987e-4 0.0013914184957808384 0.8336666823665271 -0.0024334194237465834 0.0030209410797143034 1.0002938039799212 0.9975695389411653 1.0030255087205844 default 5e-5 283 | yLwDJh ukb-b-14918 Illnesses of siblings: Severe depression || id:ukb-b-14918 Anhedonia Weighted median 51 1.6099647303034246e-4 6.610379267495823e-4 0.807578552683519 -0.001134637863398839 0.0014566308094595237 1.000161009433658 0.9988660055947547 1.0014576922114113 default 5e-5 284 | yLwDJh ukb-b-14918 Illnesses of siblings: Severe depression || id:ukb-b-14918 Anhedonia Inverse variance weighted 51 4.815801665135801e-4 5.352846423588492e-4 0.36829526420658387 -5.675777325097643e-4 0.0015307380655369246 1.0004816961448588 0.9994325833092621 1.0015319102430722 default 5e-5 285 | yLwDJh ukb-b-14918 Illnesses of siblings: Severe depression || id:ukb-b-14918 Anhedonia Simple mode 51 -0.0012440424441477506 0.0015607336633824476 0.42916875979061075 -0.004303080424377348 0.0018149955360818467 0.9987567310558648 0.9957061645608 1.0018166436374278 default 5e-5 286 | yLwDJh ukb-b-14918 Illnesses of siblings: Severe depression || id:ukb-b-14918 Anhedonia Weighted mode 51 -0.0010664199497424972 0.001358688265435043 0.4362216901071434 -0.0037294489499951813 0.0015966090505101869 0.9989341484739347 0.9962774968074414 1.0015978843093465 default 5e-5 287 | yLwDJh ukb-d-20536_0 Weight change during worst episode of depression: Stayed about the same or was on a diet || id:ukb-d-20536_0 Anhedonia MR Egger 53 -0.01585596309934879 0.005295330450080223 0.004235287237221764 -0.026234810781506027 -0.005477115417191553 0.9842690809134643 0.9741063320833273 0.9945378566324354 default 5e-5 288 | yLwDJh ukb-d-20536_0 Weight change during worst episode of depression: Stayed about the same or was on a diet || id:ukb-d-20536_0 Anhedonia Weighted median 53 -0.0059589611294940895 0.0028818129778042387 0.03866052290550559 -0.011607314565990397 -3.106076929977816e-4 0.994058758265511 0.9884597904225442 0.9996894405405776 default 5e-5 289 | yLwDJh ukb-d-20536_0 Weight change during worst episode of depression: Stayed about the same or was on a diet || id:ukb-d-20536_0 Anhedonia Inverse variance weighted 53 -0.0035686424234251707 0.0020854095572280487 0.08703627119840172 -0.007656045155592145 5.187603087418043e-4 0.9964377176131332 0.9923731877078401 1.0005188948881412 default 5e-5 290 | yLwDJh ukb-d-20536_0 Weight change during worst episode of depression: Stayed about the same or was on a diet || id:ukb-d-20536_0 Anhedonia Simple mode 53 -0.00850186477637449 0.007380758791738254 0.25463245017327985 -0.022968152008181468 0.005964422455432487 0.9915341738717408 0.9772936081164861 1.0059822450392335 default 5e-5 291 | yLwDJh ukb-d-20536_0 Weight change during worst episode of depression: Stayed about the same or was on a diet || id:ukb-d-20536_0 Anhedonia Weighted mode 53 -0.010272728055830509 0.007155169814388429 0.15707418879949436 -0.02429686089203183 0.003751404780370813 0.9897798561997339 0.9759959317252433 1.0037584501064858 default 5e-5 292 | yLwDJh finn-b-F5_BIPO Bipolar affective disorders || id:finn-b-F5_BIPO Anhedonia MR Egger 50 0.070365682031846 0.049362113270743885 0.16048365316508148 -0.02638405997881202 0.167115424042504 1.0729004499435433 0.9739609583439 1.1818906760352972 default 5e-5 293 | yLwDJh finn-b-F5_BIPO Bipolar affective disorders || id:finn-b-F5_BIPO Anhedonia Weighted median 50 0.02835480687842152 0.0262465403525297 0.2799972573990892 -0.023088412212536692 0.07979802596937974 1.0287606310229505 0.9771760856542383 1.0830682939136342 default 5e-5 294 | yLwDJh finn-b-F5_BIPO Bipolar affective disorders || id:finn-b-F5_BIPO Anhedonia Inverse variance weighted 50 0.027090727019183587 0.018141506744587067 0.13535845929211118 -0.008466626200207064 0.06264808023857424 1.0274610170103007 0.991569114739879 1.064652101182861 default 5e-5 295 | yLwDJh finn-b-F5_BIPO Bipolar affective disorders || id:finn-b-F5_BIPO Anhedonia Simple mode 50 0.024821161475131304 0.06011905366551546 0.6815052891367661 -0.093012183709279 0.1426545066595416 1.0251317710762098 0.9111823986470658 1.15333126455277 default 5e-5 296 | yLwDJh finn-b-F5_BIPO Bipolar affective disorders || id:finn-b-F5_BIPO Anhedonia Weighted mode 50 0.02021773815828415 0.04908847689923648 0.6822358636656702 -0.07599567656421935 0.11643115288078765 1.0204235009731921 0.9268202135983938 1.1234801594320676 default 5e-5 297 | yLwDJh ebi-a-GCST90016606 Bipolar disorder vs autism spectrum disorder (ordinary least squares (OLS)) || id:ebi-a-GCST90016606 Anhedonia MR Egger 49 8.466703927156629e-4 0.0029930225014299233 0.7785099341903232 -0.005019653710086986 0.006712994495518312 1.0008470289192701 0.9949929236980529 1.0067355771471909 default 5e-5 298 | yLwDJh ebi-a-GCST90016606 Bipolar disorder vs autism spectrum disorder (ordinary least squares (OLS)) || id:ebi-a-GCST90016606 Anhedonia Weighted median 49 0.0012349976214206103 0.0017585203934602756 0.48249608240764186 -0.00221170234976153 0.00468169759260275 1.0012357605450204 0.9977907416617398 1.0046926738612825 default 5e-5 299 | yLwDJh ebi-a-GCST90016606 Bipolar disorder vs autism spectrum disorder (ordinary least squares (OLS)) || id:ebi-a-GCST90016606 Anhedonia Inverse variance weighted 49 -1.1470820504201057e-4 0.0012673487672726158 0.92788165421283 -0.0025987117888963377 0.0023692953788123166 0.9998852983736926 0.9974046619395025 1.0023721043771192 default 5e-5 300 | yLwDJh ebi-a-GCST90016606 Bipolar disorder vs autism spectrum disorder (ordinary least squares (OLS)) || id:ebi-a-GCST90016606 Anhedonia Simple mode 49 0.004798756252026325 0.0032237814010211215 0.14314728175326813 -0.001519855293975073 0.011117367798027723 1.004810288722602 0.9984812991011703 1.0111793953794395 default 5e-5 301 | yLwDJh ebi-a-GCST90016606 Bipolar disorder vs autism spectrum disorder (ordinary least squares (OLS)) || id:ebi-a-GCST90016606 Anhedonia Weighted mode 49 0.00235977737223695 0.002611095975469156 0.3706415844996799 -0.0027579707396825958 0.007477525484156496 1.0023625638382423 0.9972458289676547 1.007505551990594 default 5e-5 302 | yLwDJh ieu-a-800 Bipolar disorder || id:ieu-a-800 Anhedonia MR Egger 6 -0.5032716008322752 0.2937385430387277 0.16180819595548615 -1.0789991451881815 0.07245594352363116 0.6045495759262222 0.3399355816057888 1.0751454379271463 default 5e-5 303 | yLwDJh ieu-a-800 Bipolar disorder || id:ieu-a-800 Anhedonia Weighted median 6 0.024914694340806336 0.06704220477685124 0.7101705734517332 -0.10648802702182208 0.15631741570343477 1.0252276590727227 0.8989858116343008 1.169197265768761 default 5e-5 304 | yLwDJh ieu-a-800 Bipolar disorder || id:ieu-a-800 Anhedonia Inverse variance weighted 6 -0.006041387680436813 0.05397963548525614 0.9108870312906298 -0.11184147323153884 0.09975869787066521 0.9939768248074254 0.8941859986819489 1.1049042701524867 default 5e-5 305 | yLwDJh ieu-a-800 Bipolar disorder || id:ieu-a-800 Anhedonia Simple mode 6 0.03523948900031726 0.098622974345061315 0.7354425691772839 -0.15806154071600292 0.22854051871663744 1.035867758029738 0.8537972370583827 1.2567644465827459 default 5e-5 306 | yLwDJh ieu-a-800 Bipolar disorder || id:ieu-a-800 Anhedonia Weighted mode 6 0.04107856405467741 0.09823258019661583 0.6931712052435941 -0.15145729313068962 0.23361442124004445 1.0419339608866671 0.8594545861038555 1.2631573516530086 default 5e-5 307 | yLwDJh ebi-a-GCST90016609 Bipolar disorder vs Tourette's syndrome and other tic disorders (ordinary least squares (OLS)) || id:ebi-a-GCST90016609 Anhedonia MR Egger 50 0.002914836208291132 0.0035226044760314768 0.41206788398792404 -0.003989468564730562 0.009819140981312827 1.0029190884739005 0.9960184787928935 1.0098675069204912 default 5e-5 308 | yLwDJh ebi-a-GCST90016609 Bipolar disorder vs Tourette's syndrome and other tic disorders (ordinary least squares (OLS)) || id:ebi-a-GCST90016609 Anhedonia Weighted median 50 9.023737755304055e-4 0.0023017343826186335 0.6950280720911297 -0.003609025614402116 0.0054137731654629265 1.0009027810372373 0.9963974790909716 1.0054284541165628 default 5e-5 309 | yLwDJh ebi-a-GCST90016609 Bipolar disorder vs Tourette's syndrome and other tic disorders (ordinary least squares (OLS)) || id:ebi-a-GCST90016609 Anhedonia Inverse variance weighted 50 0.00103454890357963 0.0014844959898991062 0.48586383969672414 -0.001875063236622618 0.003944161043781878 1.001035084233889 0.998126693596219 1.0039519494832048 default 5e-5 310 | yLwDJh ebi-a-GCST90016609 Bipolar disorder vs Tourette's syndrome and other tic disorders (ordinary least squares (OLS)) || id:ebi-a-GCST90016609 Anhedonia Simple mode 50 -0.0050914247963056505 0.00456378823463494 0.2700289603279398 -0.014036449736190133 0.0038536001435788315 0.9949215145377265 0.9860616019225642 1.0038610348076187 default 5e-5 311 | yLwDJh ebi-a-GCST90016609 Bipolar disorder vs Tourette's syndrome and other tic disorders (ordinary least squares (OLS)) || id:ebi-a-GCST90016609 Anhedonia Weighted mode 50 -0.0023150278559515222 0.003450664680423503 0.5054387620439595 -0.009078330629581587 0.004448274917678544 0.9976876497543893 0.9909627529963513 1.0044581831786588 default 5e-5 312 | yLwDJh ebi-a-GCST003724 Bipolar disorder || id:ebi-a-GCST003724 Anhedonia MR Egger 50 0.012111190615760119 0.04432244145833294 0.7858318925950522 -0.07476079464257245 0.09898317587409268 1.0121848280636059 0.9279654340852891 1.104047724764701 default 5e-5 313 | yLwDJh ebi-a-GCST003724 Bipolar disorder || id:ebi-a-GCST003724 Anhedonia Weighted median 50 -0.01609277807078105 0.02598478026603535 0.5357085128780985 -0.06702294739221033 0.034837391250648234 0.9840360188565674 0.9351737412919252 1.035451321664953 default 5e-5 314 | yLwDJh ebi-a-GCST003724 Bipolar disorder || id:ebi-a-GCST003724 Anhedonia Inverse variance weighted 50 0.013271291162190479 0.017240793784724852 0.4414416608968567 -0.020520664655870227 0.04706324698025119 1.0133597456152075 0.9796884513406322 1.0481883017280476 default 5e-5 315 | yLwDJh ebi-a-GCST003724 Bipolar disorder || id:ebi-a-GCST003724 Anhedonia Simple mode 50 -0.06151997562102163 0.06287922118560699 0.3326907596856985 -0.18476324914481132 0.061723297902768065 0.9403341617929691 0.8313010717960164 1.0636679848427486 default 5e-5 316 | yLwDJh ebi-a-GCST003724 Bipolar disorder || id:ebi-a-GCST003724 Anhedonia Weighted mode 50 -0.05396037024331446 0.056167528875423034 0.34141791613664463 -0.16404872683914362 0.05612798635251469 0.9474696537496443 0.848700666371802 1.057733050468943 default 5e-5 317 | yLwDJh ebi-a-GCST90016604 Bipolar disorder vs ADHD (ordinary least squares (OLS)) || id:ebi-a-GCST90016604 Anhedonia MR Egger 42 -0.007309874943706713 0.0038528621106769002 0.06502950469826621 -0.014861484680633436 2.4173479322001177e-4 0.9927167772112928 0.985248402148847 1.0002417640134296 default 5e-5 318 | yLwDJh ebi-a-GCST90016604 Bipolar disorder vs ADHD (ordinary least squares (OLS)) || id:ebi-a-GCST90016604 Anhedonia Weighted median 42 -0.001221109695918909 0.0021092921837717947 0.5626437095659742 -0.005355322376111626 0.002913102984273808 0.9987796355551505 0.9946589917990243 1.0029173501919555 default 5e-5 319 | yLwDJh ebi-a-GCST90016604 Bipolar disorder vs ADHD (ordinary least squares (OLS)) || id:ebi-a-GCST90016604 Anhedonia Inverse variance weighted 42 -0.0011707017366194396 0.0017117277838276743 0.49401946007853326 -0.004525688192921681 0.002184284719682802 0.9988299832673208 0.9954845373022712 1.0021866720074066 default 5e-5 320 | yLwDJh ebi-a-GCST90016604 Bipolar disorder vs ADHD (ordinary least squares (OLS)) || id:ebi-a-GCST90016604 Anhedonia Simple mode 42 -0.0014758347578930006 0.0035476031688760736 0.6795730137671592 -0.008429136968890104 0.0054774674531041035 0.9985252537506711 0.9916062886005936 1.005492496205258 default 5e-5 321 | yLwDJh ebi-a-GCST90016604 Bipolar disorder vs ADHD (ordinary least squares (OLS)) || id:ebi-a-GCST90016604 Anhedonia Weighted mode 42 -0.003864962453351231 0.0025619052207879393 0.13906194205248876 -0.008886296686095592 0.0011563717793931297 0.996142496900896 0.9911530697547108 1.0011570406350296 default 5e-5 322 | yLwDJh ebi-a-GCST90016608 Bipolar disorder vs obsessive compulsive disorder (ordinary least squares (OLS)) || id:ebi-a-GCST90016608 Anhedonia MR Egger 50 6.129913379264643e-4 0.00316138241344516 0.8470726155216476 -0.005583318192426049 0.006809300868278977 1.000613179255512 0.9944322395604976 1.0068325368677997 default 5e-5 323 | yLwDJh ebi-a-GCST90016608 Bipolar disorder vs obsessive compulsive disorder (ordinary least squares (OLS)) || id:ebi-a-GCST90016608 Anhedonia Weighted median 50 0.0024304974514591546 0.0017423678476166298 0.16303413332562341 -9.845435298694396e-4 0.005845538432787749 1.002433453504798 0.9990159409740935 1.0058626569319324 default 5e-5 324 | yLwDJh ebi-a-GCST90016608 Bipolar disorder vs obsessive compulsive disorder (ordinary least squares (OLS)) || id:ebi-a-GCST90016608 Anhedonia Inverse variance weighted 50 4.0422014852443966e-4 0.001327547388798028 0.760757339056645 -0.0021977727335196953 0.0030062130305685743 1.0004043018564976 0.997804640600664 1.0030107362203828 default 5e-5 325 | yLwDJh ebi-a-GCST90016608 Bipolar disorder vs obsessive compulsive disorder (ordinary least squares (OLS)) || id:ebi-a-GCST90016608 Anhedonia Simple mode 50 0.00407729420517703 0.003188806705190653 0.20705147400244442 -0.002172766936996649 0.01032735534735071 1.0040856176777657 0.9978295918124377 1.0103808665326188 default 5e-5 326 | yLwDJh ebi-a-GCST90016608 Bipolar disorder vs obsessive compulsive disorder (ordinary least squares (OLS)) || id:ebi-a-GCST90016608 Anhedonia Weighted mode 50 0.0034853113079737555 0.002588318291519206 0.1843196698457566 -0.001587792543403888 0.0085584151593514 1.0034913920678252 0.9984134673322813 1.008595143097248 default 5e-5 327 | yLwDJh ieu-b-41 bipolar disorder || id:ieu-b-41 Anhedonia MR Egger 52 -0.00987082568939333 0.03228847524674831 0.7610966416389616 -0.07315623717302003 0.05341458579423336 0.9901777310142515 0.9294556031652849 1.054866887302177 default 5e-5 328 | yLwDJh ieu-b-41 bipolar disorder || id:ieu-b-41 Anhedonia Weighted median 52 -0.016947794898270183 0.016185074925568508 0.29504197832782436 -0.04867054175238446 0.014774951955844093 0.9831950110907208 0.9524948853067563 1.0148846411100259 default 5e-5 329 | yLwDJh ieu-b-41 bipolar disorder || id:ieu-b-41 Anhedonia Inverse variance weighted 52 -0.005579955435947016 0.012214256166882624 0.6477863676093681 -0.029519897523036957 0.018359986651142926 0.9944355835995768 0.9709115587138891 1.0185295674499673 default 5e-5 330 | yLwDJh ieu-b-41 bipolar disorder || id:ieu-b-41 Anhedonia Simple mode 52 -0.05337570924935445 0.038956136641080046 0.17664209058389768 -0.12972973706587132 0.02297831856716244 0.9480237642667712 0.8783327796400029 1.0232443539029745 default 5e-5 331 | yLwDJh ieu-b-41 bipolar disorder || id:ieu-b-41 Anhedonia Weighted mode 52 -0.04372829661935071 0.040642419266823195 0.2870232946147739 -0.12338743838232417 0.035930845143622755 0.9572140004240925 0.883921131237026 1.0365841591835383 default 5e-5 332 | yLwDJh ieu-a-801 Bipolar disorder || id:ieu-a-801 Anhedonia MR Egger 28 0.010942577514702817 0.08981934134529662 0.90397138935682 -0.16510333152207857 0.1869884865514842 1.011002666492125 0.8478060944674073 1.2056134042021573 default 5e-5 333 | yLwDJh ieu-a-801 Bipolar disorder || id:ieu-a-801 Anhedonia Weighted median 28 0.03588753311396246 0.034266213158146056 0.29495413067983195 -0.03127424467600381 0.10304931090392871 1.036539263591957 0.9692097360154596 1.1085460711370927 default 5e-5 334 | yLwDJh ieu-a-801 Bipolar disorder || id:ieu-a-801 Anhedonia Inverse variance weighted 28 -0.0037020485593789484 0.025414135786051725 0.8841827936806658 -0.05351375470004033 0.04610965758128244 0.9963047955740127 0.9478929029315858 1.047189236899918 default 5e-5 335 | yLwDJh ieu-a-801 Bipolar disorder || id:ieu-a-801 Anhedonia Simple mode 28 0.04000652175410169 0.06347495340723479 0.5338147500482391 -0.08440438692407849 0.16441743043228185 1.0408175621264586 0.9190595252841761 1.1787062402687183 default 5e-5 336 | yLwDJh ieu-a-801 Bipolar disorder || id:ieu-a-801 Anhedonia Weighted mode 28 0.041665169249816114 0.06004739583602788 0.4936899366815515 -0.07602772658879853 0.15935806508843076 1.0425453440638568 0.9267905094637792 1.1727577951333175 default 5e-5 337 | yLwDJh ebi-a-GCST90016621 Schizophrenia vs bipolar disorder (ordinary least squares (OLS)) || id:ebi-a-GCST90016621 Anhedonia MR Egger 31 0.0018617520758949092 0.003088335628969751 0.5513050761538261 -0.004191385756885803 0.00791488990867562 1.0018634862123013 0.9958173858410662 1.0079462954522695 default 5e-5 338 | yLwDJh ebi-a-GCST90016621 Schizophrenia vs bipolar disorder (ordinary least squares (OLS)) || id:ebi-a-GCST90016621 Anhedonia Weighted median 31 0.0021351398052256517 0.0016865621643707928 0.20552324943281247 -0.0011705220369411019 0.005440801647392406 1.002137420839373 0.9988301627567636 1.005455629688622 default 5e-5 339 | yLwDJh ebi-a-GCST90016621 Schizophrenia vs bipolar disorder (ordinary least squares (OLS)) || id:ebi-a-GCST90016621 Anhedonia Inverse variance weighted 31 0.0012168583387964316 0.0012508860772163812 0.3306541580960879 -0.0012348783725476757 0.0036685950501405386 1.0012175990113055 0.9987658837759973 1.0036753325815335 default 5e-5 340 | yLwDJh ebi-a-GCST90016621 Schizophrenia vs bipolar disorder (ordinary least squares (OLS)) || id:ebi-a-GCST90016621 Anhedonia Simple mode 31 0.0014514450062975137 0.0024377866052453325 0.5560449615324617 -0.0033266167399833377 0.006229506752578365 1.0014524988624103 0.9966789103189831 1.0062489504837517 default 5e-5 341 | yLwDJh ebi-a-GCST90016621 Schizophrenia vs bipolar disorder (ordinary least squares (OLS)) || id:ebi-a-GCST90016621 Anhedonia Weighted mode 31 0.0018627327595820801 0.0019417299574953641 0.34506778005081395 -0.0019430579571088334 0.005668523476272993 1.0018644687239608 0.9980588285579364 1.0056846199555245 default 5e-5 342 | yLwDJh ebi-a-GCST90016605 Bipolar disorder vs anorexia nervosa (ordinary least squares (OLS)) || id:ebi-a-GCST90016605 Anhedonia MR Egger 39 -0.0018311168155711241 0.003427089441162787 0.5963255051088239 -0.008548212120250186 0.004885978489107938 0.9981705586560076 0.991488219961349 1.004897934346095 default 5e-5 343 | yLwDJh ebi-a-GCST90016605 Bipolar disorder vs anorexia nervosa (ordinary least squares (OLS)) || id:ebi-a-GCST90016605 Anhedonia Weighted median 39 -1.989542553134852e-4 0.0020240764641450003 0.9216989666400716 -0.004166144125037685 0.003768235614410715 0.9998010655347719 0.9958425222141477 1.0037753443405473 default 5e-5 344 | yLwDJh ebi-a-GCST90016605 Bipolar disorder vs anorexia nervosa (ordinary least squares (OLS)) || id:ebi-a-GCST90016605 Anhedonia Inverse variance weighted 39 8.941098896649407e-4 0.0014755476565195837 0.5445471515169955 -0.0019979635171134434 0.003786183296443325 1.000894509725069 0.9980040310833936 1.0037933599429283 default 5e-5 345 | yLwDJh ebi-a-GCST90016605 Bipolar disorder vs anorexia nervosa (ordinary least squares (OLS)) || id:ebi-a-GCST90016605 Anhedonia Simple mode 39 -4.0441344696908604e-4 0.00311742833693906 0.8974669858686786 -0.006514572987369644 0.005705746093431472 0.9995956683171264 0.993506600838805 1.0057220548658237 default 5e-5 346 | yLwDJh ebi-a-GCST90016605 Bipolar disorder vs anorexia nervosa (ordinary least squares (OLS)) || id:ebi-a-GCST90016605 Anhedonia Weighted mode 39 -2.1685032050854092e-4 0.0024165411652900676 0.9289684601702286 -0.004953271004477074 0.004519570363459992 0.9997831731898228 0.9950589762127389 1.0045297990255089 default 5e-5 347 | yLwDJh ieu-a-297 Alzheimer's disease || id:ieu-a-297 Anhedonia MR Egger 48 0.0025324303344853123 0.03632668557284026 0.9447245358057611 -0.06866787338828159 0.07373273405725222 1.0025356396447311 0.9336367141885221 1.0765190501655044 default 5e-5 348 | yLwDJh ieu-a-297 Alzheimer's disease || id:ieu-a-297 Anhedonia Weighted median 48 0.006328586088249538 0.018594137412615855 0.7335900753987266 -0.030115923240477536 0.04277309541697661 1.006348653900478 0.9703330428778197 1.043701047429778 default 5e-5 349 | yLwDJh ieu-a-297 Alzheimer's disease || id:ieu-a-297 Anhedonia Inverse variance weighted 48 0.019962283007816134 0.013202748906026882 0.13053912941328702 -0.005915104847996556 0.04583967086362882 1.0201628618264336 0.9941023549422258 1.046906547877943 default 5e-5 350 | yLwDJh ieu-a-297 Alzheimer's disease || id:ieu-a-297 Anhedonia Simple mode 48 0.001855930293421959 0.04056944365018041 0.9637057281972898 -0.07766017926093165 0.08137203984777557 1.001857653597995 0.9252788020512126 1.084774400805225 default 5e-5 351 | yLwDJh ieu-a-297 Alzheimer's disease || id:ieu-a-297 Anhedonia Weighted mode 48 -3.8532333235685723e-4 0.03629175174029492 0.9915736556752199 -0.07151715674333489 0.07074651007862118 0.9996147508951442 0.9309803048677018 1.0733091183375336 default 5e-5 352 | yLwDJh ieu-a-1189 Obsessive Compulsive Disorder || id:ieu-a-1189 Anhedonia MR Egger 52 -0.060413147615741715 0.06816279852515428 0.37969538073381515 -0.1940122327250441 0.07318593749356067 0.941375526176883 0.8236478287495291 1.075930574151119 default 5e-5 353 | yLwDJh ieu-a-1189 Obsessive Compulsive Disorder || id:ieu-a-1189 Anhedonia Weighted median 52 -0.01193661054278926 0.03534509917172354 0.7355771089365775 -0.08121300491936741 0.05733978383378889 0.9881343481766824 0.9219972805707046 1.0590155856448644 default 5e-5 354 | yLwDJh ieu-a-1189 Obsessive Compulsive Disorder || id:ieu-a-1189 Anhedonia Inverse variance weighted 52 -0.014700165136520357 0.02573044744841816 0.5677868058694876 -0.06513184213541995 0.03573151186237924 0.9854073547926591 0.936943926545858 1.0363775540541265 default 5e-5 355 | yLwDJh ieu-a-1189 Obsessive Compulsive Disorder || id:ieu-a-1189 Anhedonia Simple mode 52 -0.008390244636065858 0.08004421111818312 0.9169297001917536 -0.16527689842770477 0.14849640915557305 0.9916448552323688 0.8476589561565595 1.1600886320691486 default 5e-5 356 | yLwDJh ieu-a-1189 Obsessive Compulsive Disorder || id:ieu-a-1189 Anhedonia Weighted mode 52 -0.0058135015957646585 0.07720100727820145 0.9402678967221139 -0.1571274758610395 0.1455004726695102 0.9942033641058822 0.8545951116260694 1.1566182812802563 default 5e-5 357 | yLwDJh ieu-b-42 schizophrenia || id:ieu-b-42 Anhedonia MR Egger 52 0.01056929120872071 0.028980637543233875 0.716872030281974 -0.04623275837601768 0.0673713407934591 1.0106253434705519 0.9548196940429564 1.0696926249397416 default 5e-5 358 | yLwDJh ieu-b-42 schizophrenia || id:ieu-b-42 Anhedonia Weighted median 52 0.007327600095233961 0.012381812964565607 0.5539821875159673 -0.016940753315314624 0.03159595350578255 1.007354512651469 0.9832019343643282 1.0321004044966158 default 5e-5 359 | yLwDJh ieu-b-42 schizophrenia || id:ieu-b-42 Anhedonia Inverse variance weighted 52 0.007031031777891812 0.01098121388805762 0.5219917558268401 -0.014492147442701124 0.02855421099848475 1.007055807514114 0.9856123582795125 1.0289657905854865 default 5e-5 360 | yLwDJh ieu-b-42 schizophrenia || id:ieu-b-42 Anhedonia Simple mode 52 0.030434810618093666 0.030983996090646025 0.33060135039501204 -0.03029382171957254 0.09116344295575987 1.0309026839494704 0.9701604374588522 1.095448033892123 default 5e-5 361 | yLwDJh ieu-b-42 schizophrenia || id:ieu-b-42 Anhedonia Weighted mode 52 0.02183390969604171 0.026526243362268224 0.4142800414757172 -0.030157527294004012 0.07382534668608742 1.0220740137885784 0.9702926739297272 1.0766187540415793 default 5e-5 362 | yLwDJh ieu-b-10 focal epilepsy, all documented cases || id:ieu-b-10 Anhedonia MR Egger 25 -0.023257444675535775 0.04608889690820196 0.618625380622509 -0.11359168261561162 0.06707679326454008 0.9770109251328345 0.8926223547072787 1.0693775960181355 default 5e-5 363 | yLwDJh ieu-b-10 focal epilepsy, all documented cases || id:ieu-b-10 Anhedonia Weighted median 25 -0.009438313911284177 0.014481450579924674 0.514561191995069 -0.03782195704793653 0.018945329225368183 0.990606087173201 0.9628843604047508 1.0191259306902725 default 5e-5 364 | yLwDJh ieu-b-10 focal epilepsy, all documented cases || id:ieu-b-10 Anhedonia Inverse variance weighted 25 -0.006168557779386388 0.01309691024307461 0.6376454756292209 -0.03183850185581263 0.01950138629703985 0.9938504287133333 0.9686630067256417 1.0196927804567617 default 5e-5 365 | yLwDJh ieu-b-10 focal epilepsy, all documented cases || id:ieu-b-10 Anhedonia Simple mode 25 -0.01300783595113833 0.027817967203689592 0.6442848502240093 -0.06753105167036993 0.04151537976809327 0.9870764003075406 0.9346986962095918 1.04238919343225 default 5e-5 366 | yLwDJh ieu-b-10 focal epilepsy, all documented cases || id:ieu-b-10 Anhedonia Weighted mode 25 -0.01621235320129938 0.028914984366041143 0.5802059647944284 -0.07288572255874001 0.04046101615614126 0.9839183596558753 0.9297070685002561 1.041290715396601 default 5e-5 367 | yLwDJh ieu-a-1183 ADHD || id:ieu-a-1183 Anhedonia MR Egger 43 0.05090313869036644 0.032639858031449184 0.12655535081960628 -0.013070983051273959 0.11487726043200683 1.05222096884595 0.9870140712632188 1.1217357477610346 default 5e-5 368 | yLwDJh ieu-a-1183 ADHD || id:ieu-a-1183 Anhedonia Weighted median 43 -0.011845587114932627 0.01692761220518209 0.4840653470931297 -0.04502370703708952 0.02133253280722427 0.9882242956458378 0.955974818233985 1.0215616979417987 default 5e-5 369 | yLwDJh ieu-a-1183 ADHD || id:ieu-a-1183 Anhedonia Inverse variance weighted 43 -0.00653545219524114 0.012733822850756627 0.6077864721510157 -0.03149374498272413 0.01842284059224185 0.9934858574245182 0.9689970175278685 1.01859358805936 default 5e-5 370 | yLwDJh ieu-a-1183 ADHD || id:ieu-a-1183 Anhedonia Simple mode 43 -0.011079705675491935 0.04229107542375763 0.7946122488448308 -0.09397021350605689 0.07181080215507302 0.9889814481994106 0.9103098767765724 1.0744520408215517 default 5e-5 371 | yLwDJh ieu-a-1183 ADHD || id:ieu-a-1183 Anhedonia Weighted mode 43 -0.007033647989728553 0.03964833888584026 0.8600463627409461 -0.08474439220597546 0.07067709622651835 0.9929910302191176 0.9187470933084726 1.0732346184028263 default 5e-5 372 | yLwDJh ieu-b-18 multiple sclerosis || id:ieu-b-18 Anhedonia MR Egger 37 -0.02194127123039207 0.0536186690557087 0.6848793549213772 -0.12703386257958113 0.08315132011879699 0.9782976875836373 0.8807038491880305 1.0867062366241098 default 5e-5 373 | yLwDJh ieu-b-18 multiple sclerosis || id:ieu-b-18 Anhedonia Weighted median 37 -0.014608853596110588 0.022500533909946715 0.5161658277724341 -0.05870990005960615 0.02949219286738497 0.9854973379643448 0.9429802880066238 1.0299313946295214 default 5e-5 374 | yLwDJh ieu-b-18 multiple sclerosis || id:ieu-b-18 Anhedonia Inverse variance weighted 37 -0.010353400491080094 0.015783046527914724 0.5118354586329097 -0.041288171685792956 0.020581370703632765 0.989700011469051 0.9595525742190278 1.0207946276409625 default 5e-5 375 | yLwDJh ieu-b-18 multiple sclerosis || id:ieu-b-18 Anhedonia Simple mode 37 -0.030304985286389585 0.0477657513016113 0.5297986056538221 -0.12392585783754773 0.06331588726476856 0.9701496070684383 0.8834453390024768 1.0653633207887767 default 5e-5 376 | yLwDJh ieu-b-18 multiple sclerosis || id:ieu-b-18 Anhedonia Weighted mode 37 -0.031964772898706806 0.0411564516441722 0.4424299218125217 -0.11263141812128431 0.0487018723238707 0.9685407003596082 0.893479919940172 1.0499072976546515 default 5e-5 377 | yLwDJh ieu-b-2 Alzheimer's disease || id:ieu-b-2 Anhedonia MR Egger 52 0.00647728527647044 0.02875854621564016 0.822718438922529 -0.04988946530618428 0.06284403585912515 1.006498308254845 0.9513345741651357 1.0648607461879322 default 5e-5 378 | yLwDJh ieu-b-2 Alzheimer's disease || id:ieu-b-2 Anhedonia Weighted median 52 0.0034250737126737675 0.01643305924433543 0.8348965039797596 -0.028783722406223677 0.03563386983157121 1.0034309459800446 0.9716265828032195 1.0362763649852982 default 5e-5 379 | yLwDJh ieu-b-2 Alzheimer's disease || id:ieu-b-2 Anhedonia Inverse variance weighted 52 0.006337065732182994 0.011034931183843752 0.5657829117119736 -0.015291399388150759 0.027965530852516747 1.0063571874149166 0.9848249204072423 1.0283602371098304 default 5e-5 380 | yLwDJh ieu-b-2 Alzheimer's disease || id:ieu-b-2 Anhedonia Simple mode 52 -0.008577025368087937 0.039438667472974545 0.828703941052224 -0.08587681361511805 0.06872276287894218 0.9914596523771034 0.9177072732987631 1.071139208430039 default 5e-5 381 | yLwDJh ieu-b-2 Alzheimer's disease || id:ieu-b-2 Anhedonia Weighted mode 52 -0.005782719354796656 0.040455324835897914 0.8869001374621366 -0.08507515603315656 0.07350971732356325 0.994233968384439 0.9184432552557671 1.0762789951723177 default 5e-5 382 | yLwDJh ieu-b-5070 Schizophrenia || id:ieu-b-5070 Anhedonia MR Egger 34 -1.9488160513987498 1.7987322917597142 0.28671003825904046 -5.47433134324779 1.5766992404502898 0.1424426165291492 0.004193031311536121 4.838957187810032 default 5e-5 383 | yLwDJh ieu-b-5070 Schizophrenia || id:ieu-b-5070 Anhedonia Weighted median 34 -1.7531995434374703 0.20739111378022576 2.82478866548773e-17 -2.159686126446713 -1.3467129604282277 0.17321883469092678 0.11536132422490024 0.2600937956744278 default 5e-5 384 | yLwDJh ieu-b-5070 Schizophrenia || id:ieu-b-5070 Anhedonia Inverse variance weighted 34 -0.16672175752054066 0.6127275297202452 0.7855468905114115 -1.3676677157722212 1.03422420073114 0.8464350927741144 0.254700300858059 2.812923125201933 default 5e-5 385 | yLwDJh ieu-b-5070 Schizophrenia || id:ieu-b-5070 Anhedonia Simple mode 34 4.021965323816421 0.3023624643639347 8.226651449887662e-15 3.4293348936631087 4.614595753969732 55.810684179881015 30.85611332680372 100.94701285403515 default 5e-5 386 | yLwDJh ieu-b-5070 Schizophrenia || id:ieu-b-5070 Anhedonia Weighted mode 34 -2.3421327661116873 0.21912779124216314 2.9778722566124037e-12 -2.771623236946327 -1.9126422952770477 0.09612241283473306 0.0625603719702759 0.14768963096256515 default 5e-5 387 | yLwDJh ieu-a-22 Schizophrenia || id:ieu-a-22 Anhedonia MR Egger 51 0.013063186946282529 0.029300573526463883 0.6576810764818646 -0.04436593716558668 0.07049231105815174 1.0131488831213615 0.9566038365192938 1.073036318885137 default 5e-5 388 | yLwDJh ieu-a-22 Schizophrenia || id:ieu-a-22 Anhedonia Weighted median 51 0.013525769820957868 0.012268173698546983 0.27024052217059175 -0.01051985062819422 0.03757139027010996 1.0136176568591824 0.9895352894758196 1.0382861179624514 default 5e-5 389 | yLwDJh ieu-a-22 Schizophrenia || id:ieu-a-22 Anhedonia Inverse variance weighted 51 0.008725314724035982 0.010798506249682455 0.41908409571395766 -0.01243975752534163 0.029890386973413594 1.0087634912357986 0.9876372964165737 1.030341588903528 default 5e-5 390 | yLwDJh ieu-a-22 Schizophrenia || id:ieu-a-22 Anhedonia Simple mode 51 0.029868104831773212 0.027185488423351025 0.27717083968878514 -0.023415452477994793 0.08315166214154121 1.0303186309420833 0.9768565619791882 1.0867066083024224 default 5e-5 391 | yLwDJh ieu-a-22 Schizophrenia || id:ieu-a-22 Anhedonia Weighted mode 51 0.023381878473471063 0.02738634375241379 0.39729956619804907 -0.03029535528125997 0.0770591122282021 1.02365737763287 0.9701589496591154 1.0801059219732965 default 5e-5 392 | yLwDJh ieu-a-1184 Autism Spectrum Disorder || id:ieu-a-1184 Anhedonia MR Egger 53 -0.021067058034584925 0.055090027507024394 0.7037452380232123 -0.12904351194835273 0.0869093958791829 0.9791533022718842 0.8789357205078551 1.090797844461218 default 5e-5 393 | yLwDJh ieu-a-1184 Autism Spectrum Disorder || id:ieu-a-1184 Anhedonia Weighted median 53 -0.00650200089111769 0.029329439533342536 0.8245563449550943 -0.06398770237646906 0.05098370059423368 0.9935190913779337 0.93801653483401215 1.052305741185154 default 5e-5 394 | yLwDJh ieu-a-1184 Autism Spectrum Disorder || id:ieu-a-1184 Anhedonia Inverse variance weighted 53 0.005649789246639111 0.02088763445824911 0.7867872495354649 -0.03528997429152915 0.046589552784807364 1.0056657794053971 0.9653254561036758 1.0476918985947103 default 5e-5 395 | yLwDJh ieu-a-1184 Autism Spectrum Disorder || id:ieu-a-1184 Anhedonia Simple mode 53 -0.011288068756607983 0.0629327023855655 0.8583464033060569 -0.13463616543231638 0.1120600279191004 0.9887754024446067 0.8740338575753867 1.1185800046597942 default 5e-5 396 | yLwDJh ieu-a-1184 Autism Spectrum Disorder || id:ieu-a-1184 Anhedonia Weighted mode 53 -0.009419902490714505 0.06704197816477732 0.8888018761357176 -0.14082217969367805 0.12198237471224904 0.9906243258063898 0.8686437604647679 1.1297341897146655 default 5e-5 397 | yLwDJh ieu-a-803 PGC cross-disorder traits || id:ieu-a-803 Anhedonia MR Egger 23 0.016722042574057544 0.050486578944794434 0.7437625529568498 -0.08223165215773955 0.11567573730585463 1.0168626385184896 0.9210585687763236 1.1226317854992893 default 5e-5 398 | yLwDJh ieu-a-803 PGC cross-disorder traits || id:ieu-a-803 Anhedonia Weighted median 23 0.020671809620300956 0.019961630986170483 0.30039944044082445 -0.01845298711259319 0.0597966063531951 1.0208869513759935 0.9817162268213452 1.0616205976999031 default 5e-5 399 | yLwDJh ieu-a-803 PGC cross-disorder traits || id:ieu-a-803 Anhedonia Inverse variance weighted 23 0.009424587465025423 0.014136123962679626 0.504962259383178 -0.018282215501826644 0.03713139043187749 1.0094691387386028 0.9818838903983972 1.037829372729792 default 5e-5 400 | yLwDJh ieu-a-803 PGC cross-disorder traits || id:ieu-a-803 Anhedonia Simple mode 23 0.027325201052322196 0.04148806570645173 0.5169690612833975 -0.05399140773232319 0.10864180983696758 1.0277019581849725 0.9474402471270361 1.1147629816866031 default 5e-5 401 | yLwDJh ieu-a-803 PGC cross-disorder traits || id:ieu-a-803 Anhedonia Weighted mode 23 0.027325201052322196 0.03934387769190627 0.4946246496043458 -0.04978879922381409 0.10443920132845848 1.0277019581849725 0.9514303461101525 1.1100878999448562 default 5e-5 402 | yLwDJh ieu-a-1185 Autism Spectrum Disorder || id:ieu-a-1185 Anhedonia MR Egger 50 -0.007422986907349971 0.028357358445593405 0.7946220453902932 -0.06300340946071305 0.0481574356460131 0.9926044954176076 0.9389402724037053 1.0493358451874146 default 5e-5 403 | yLwDJh ieu-a-1185 Autism Spectrum Disorder || id:ieu-a-1185 Anhedonia Weighted median 50 0.010050802204978164 0.015618559366672372 0.5198889476110956 -0.020561574153699684 0.04066317856365601 1.0101014811632176 0.9796483735978443 1.04150124651457 default 5e-5 404 | yLwDJh ieu-a-1185 Autism Spectrum Disorder || id:ieu-a-1185 Anhedonia Inverse variance weighted 50 0.0052148844383407885 0.010705125112182527 0.6261597973373755 -0.015767160781536962 0.026196929658218543 1.005228505615522 0.9843564901702148 1.0265430853483604 default 5e-5 405 | yLwDJh ieu-a-1185 Autism Spectrum Disorder || id:ieu-a-1185 Anhedonia Simple mode 50 0.02780891237518418 0.03408635256478641 0.41854160638865634 -0.03900033865179718 0.09461816340216554 1.0281991895071894 0.9617503834478158 1.0992390452845646 default 5e-5 406 | yLwDJh ieu-a-1185 Autism Spectrum Disorder || id:ieu-a-1185 Anhedonia Weighted mode 50 0.023813008102484712 0.033524181593917936 0.4808708419675114 -0.041894387821594437 0.08952040402656386 1.0240988018070085 0.9589710542465906 1.093649647941164 default 5e-5 407 | yLwDJh ieu-a-802 Autism || id:ieu-a-802 Anhedonia MR Egger 23 -0.04325056652691005 0.10790409808796848 0.6925985422666894 -0.25474259877932826 0.1682414657255082 0.9576713996049779 0.7751159880869744 1.1832222837834785 default 5e-5 408 | yLwDJh ieu-a-802 Autism || id:ieu-a-802 Anhedonia Weighted median 23 -0.005211427305570209 0.04483185242247897 0.9074592818800206 -0.09308185805362898 0.08265900344248855 0.9948021286229085 0.9111189148224794 1.0861713646955597 default 5e-5 409 | yLwDJh ieu-a-802 Autism || id:ieu-a-802 Anhedonia Inverse variance weighted 23 0.014636665019249274 0.03201009692764849 0.6474902814683068 -0.048103124958941756 0.07737645499744031 1.0147443055255223 0.9530355002628453 1.0804487401702072 default 5e-5 410 | yLwDJh ieu-a-802 Autism || id:ieu-a-802 Anhedonia Simple mode 23 -0.02185776735384104 0.07804073939453594 0.7820316445449861 -0.1748176165671315 0.1311020818594494 0.9783793826438512 0.8396101377849798 1.1400841572826557 default 5e-5 411 | yLwDJh ieu-a-802 Autism || id:ieu-a-802 Anhedonia Weighted mode 23 -0.015987636727644916 0.07422288641853343 0.8314395984221281 -0.16146449410797045 0.12948922065268062 0.9841394871645875 0.8508967427769077 1.1382468418386122 default 5e-5 412 | yLwDJh ieu-a-1085 Amyotrophic lateral sclerosis || id:ieu-a-1085 Anhedonia MR Egger 46 0.0016664908684408059 0.008373955950558547 0.8431726410650813 -0.014746462794653949 0.01807944453153556 1.0016678802360304 0.9853617337959053 1.018243867083599 default 5e-5 413 | yLwDJh ieu-a-1085 Amyotrophic lateral sclerosis || id:ieu-a-1085 Anhedonia Weighted median 46 -7.080210785626535e-4 0.004037504938473811 0.8607959491192436 -0.008621530757971323 0.007205488600846016 0.9992922295092173 0.991415528060613 1.0072315105966858 default 5e-5 414 | yLwDJh ieu-a-1085 Amyotrophic lateral sclerosis || id:ieu-a-1085 Anhedonia Inverse variance weighted 46 -0.0023171072777061546 0.0028446028768915332 0.4153226931377432 -0.007892528916413559 0.0032583143610012506 0.997685575143143 0.9921385353111069 1.003263628437315 default 5e-5 415 | yLwDJh ieu-a-1085 Amyotrophic lateral sclerosis || id:ieu-a-1085 Anhedonia Simple mode 46 -4.1209135243719386e-4 0.009436603717259549 0.9653610902501972 -0.018907834638265907 0.01808365193339152 0.9995879935455418 0.9812697971610727 1.0182481512537478 default 5e-5 416 | yLwDJh ieu-a-1085 Amyotrophic lateral sclerosis || id:ieu-a-1085 Anhedonia Weighted mode 46 6.325134659817683e-4 0.00898562812154201 0.9441938117787392 -0.01697931765224057 0.018244344584204108 1.000632713544806 0.9831640185647688 1.018411789395729 default 5e-5 417 | yLwDJh ieu-a-806 Autism || id:ieu-a-806 Anhedonia MR Egger 53 -0.02263897096007037 0.05509536524742543 0.6828635219670187 -0.13062588684502421 0.08534794492488347 0.9776153676063758 0.877546014495864 1.0890959461871657 default 5e-5 418 | yLwDJh ieu-a-806 Autism || id:ieu-a-806 Anhedonia Weighted median 53 -0.006534394602815882 0.029928089610197422 0.8271669305908514 -0.06519345023880282 0.052124661033171066 0.9934869081281912 0.9368862049856436 1.05350706560701 default 5e-5 419 | yLwDJh ieu-a-806 Autism || id:ieu-a-806 Anhedonia Inverse variance weighted 53 0.006118899760187847 0.020888901419108666 0.7695788092715493 -0.03482334702126514 0.047061146541640834 1.0061376584686936 0.9657760083979922 1.04818610007518 default 5e-5 420 | yLwDJh ieu-a-806 Autism || id:ieu-a-806 Anhedonia Simple mode 53 -0.011311747600609823 0.06850432151902297 0.8694861896608496 -0.14558021777789484 0.1229567225766752 0.9887519896632943 0.8645205373758783 1.130835480242694 default 5e-5 421 | yLwDJh ieu-a-806 Autism || id:ieu-a-806 Anhedonia Weighted mode 53 -0.009440424155516047 0.059880195291141275 0.8753391117665534 -0.12680560692615295 0.10792475861512085 0.9906039967546251 0.8809048977649678 1.1139639260446645 default 5e-5 422 | yLwDJh ieu-b-8 epilepsy, all documented cases || id:ieu-b-8 Anhedonia MR Egger 23 -0.002139801000123977 0.0373395515402306 0.9548427829995052 -0.07532532201897596 0.071045720018728 0.9978624867419742 0.9274417200327605 1.0736303111441914 default 5e-5 423 | yLwDJh ieu-b-8 epilepsy, all documented cases || id:ieu-b-8 Anhedonia Weighted median 23 -0.021882398421592546 0.01248068615542981 0.07955036901944249 -0.04634454328623497 0.002579746443049879 0.9783552844117743 0.9547129655746114 1.0025830768521597 default 5e-5 424 | yLwDJh ieu-b-8 epilepsy, all documented cases || id:ieu-b-8 Anhedonia Inverse variance weighted 23 -0.004744269214957801 0.010615166022833562 0.6549233533689096 -0.02554999461971158 0.01606145618979598 0.9952669670539164 0.9747736443098638 1.016191134722371 default 5e-5 425 | yLwDJh ieu-b-8 epilepsy, all documented cases || id:ieu-b-8 Anhedonia Simple mode 23 -0.03287903581660456 0.023793443984290324 0.18088896006390504 -0.07951418602581359 0.01375611439260447 0.9676556041797553 0.9235649181599058 1.0138511650768078 default 5e-5 426 | yLwDJh ieu-b-8 epilepsy, all documented cases || id:ieu-b-8 Anhedonia Weighted mode 23 -0.03287903581660456 0.021505814006863123 0.14055497375246648 -0.07503043127005629 0.00927235963684716 0.9676556041797553 0.9277152543455471 1.0093154811397775 default 5e-5 427 | yLwDJh ieu-b-7 Parkinson's disease || id:ieu-b-7 Anhedonia MR Egger 51 -0.040062275689126355 0.04737866376232022 0.4018994425804493 -0.132924456663274 0.052799905285021285 0.9607296071909524 0.8755312301611293 1.0542186804272144 default 5e-5 428 | yLwDJh ieu-b-7 Parkinson's disease || id:ieu-b-7 Anhedonia Weighted median 51 -0.009470660417015381 0.02388092620233601 0.691678355251846 -0.056277275773593954 0.037335954939563196 0.9905740450459531 0.9452769971390709 1.038041697500802 default 5e-5 429 | yLwDJh ieu-b-7 Parkinson's disease || id:ieu-b-7 Anhedonia Inverse variance weighted 51 -0.005090515530393079 0.01848580115687661 0.7830286461260545 -0.04132268579787123 0.03114165473708507 0.9949224191863566 0.9595194566854506 1.0316316290437988 default 5e-5 430 | yLwDJh ieu-b-7 Parkinson's disease || id:ieu-b-7 Anhedonia Simple mode 51 -0.019137732030053423 0.06021971856305591 0.7519613154589568 -0.13716838041364302 0.09889291635353617 0.9810442317235117 0.8718234157850893 1.1039480784434743 default 5e-5 431 | yLwDJh ieu-b-7 Parkinson's disease || id:ieu-b-7 Anhedonia Weighted mode 51 -0.040333506857260504 0.05014407592565134 0.42500153870927726 -0.13861589567153712 0.05794888195701611 0.9604690627128217 0.8705623510139922 1.059660826538109 default 5e-5 432 | yLwDJh ieu-b-5075 Systolic blood pressure || id:ieu-b-5075 Anhedonia MR Egger 34 -0.01375533114550779 0.00752326987995514 0.07682916655698153 -0.028500940110219863 9.902778192042837e-4 0.9863388411371454 0.9719013804512866 1.0009907683061767 default 5e-5 433 | yLwDJh ieu-b-5075 Systolic blood pressure || id:ieu-b-5075 Anhedonia Weighted median 34 0.001788543480694921 0.0038264953718044757 0.6402063303121991 -0.005711387448041852 0.009288474409431693 1.001790143878571 0.9943048915186753 1.0093317461602755 default 5e-5 434 | yLwDJh ieu-b-5075 Systolic blood pressure || id:ieu-b-5075 Anhedonia Inverse variance weighted 34 0.0010343763858440733 0.0027697472780986573 0.7088097195689573 -0.004394328279229295 0.006463081050917441 1.001034911537598 0.9956153126543048 1.006484011827391 default 5e-5 435 | yLwDJh ieu-b-5075 Systolic blood pressure || id:ieu-b-5075 Anhedonia Simple mode 34 0.0038451198243767415 0.006201863574084693 0.5395195257104599 -0.008310532780829256 0.01600077242958274 1.0038525217817056 0.9917239042340446 1.0161294702942545 default 5e-5 436 | yLwDJh ieu-b-5075 Systolic blood pressure || id:ieu-b-5075 Anhedonia Weighted mode 34 6.878288565542734e-4 0.004633018493525408 0.8828813935180377 -0.008392887390755527 0.009768545103864074 1.0006880654650678 0.9916422345617399 1.0098164130804514 default 5e-5 437 | -------------------------------------------------------------------------------- /ex/output/Anhedonia_all_mr_res_signif.tsv: -------------------------------------------------------------------------------- 1 | id.exposure id.outcome outcome exposure method nsnp b se pval lo_ci up_ci or or_lci95 or_uci95 outcome.pipename exposure_threshold_pval 2 | yLwDJh ebi-a-GCST90016613 Major depressive disorder vs anorexia nervosa (ordinary least squares (OLS)) || id:ebi-a-GCST90016613 Anhedonia Inverse variance weighted 39 0.00247772269214787 0.00101146274317825 0.01429978904195326 4.952557155184908e-4 0.00446018966877725 1.0024807947837573 1.000495378374879 1.0044701511191978 default 5e-5 3 | yLwDJh ebi-a-GCST009983 Trauma exposure in major depressive disorder || id:ebi-a-GCST009983 Anhedonia Inverse variance weighted 38 -0.02746695338979478 0.01081408730418804 0.01108767498247956 -0.04866256450600334 -0.00627134227358622 0.9729068332951004 0.95250248362344 0.99374828154937 default 5e-5 4 | yLwDJh ebi-a-GCST009979 Major depressive disorder || id:ebi-a-GCST009979 Anhedonia Inverse variance weighted 51 0.01222135292958728 0.00506308945795918 0.01578654701094858 0.00229769759198729 0.02214500826718728 1.0122963388283153 1.002300339322011 1.02239202901835 default 5e-5 5 | yLwDJh ukb-d-20446 Ever had prolonged feelings of sadness or depression || id:ukb-d-20446 Anhedonia Inverse variance weighted 53 0.00386981961417049 0.00147084422330723 0.00851291885870247 9.869649364883056e-4 0.00675267429185267 1.003877317034195 1.0009874521466544 1.0067755250024109 default 5e-5 6 | yLwDJh ukb-d-20445 Depression possibly related to childbirth || id:ukb-d-20445 Anhedonia Inverse variance weighted 53 0.0036164910716845 0.00177321368523176 0.04139892771181308 1.4099224863024047e-4 0.00709198989473876 1.0036230384660054 1.0001410021885044 1.007117197610793 default 5e-5 7 | yLwDJh ebi-a-GCST009981 Major depressive disorder in trauma-unexposed individuals || id:ebi-a-GCST009981 Anhedonia Inverse variance weighted 51 0.02573856063894159 0.01018571230900258 0.01150651215062374 0.00577456451329653 0.04570255676458665 1.0260726576240675 1.0057912694500548 1.0467630120704656 default 5e-5 8 | -------------------------------------------------------------------------------- /ex/output/Anhedonia_target_GWAS_subcategories.csv: -------------------------------------------------------------------------------- 1 | GWAS_subcategory 2 | Psychiatric / neurological 3 | -------------------------------------------------------------------------------- /ex/output/Anhedonia_twosample_forward.rds: -------------------------------------------------------------------------------- https://raw.githubusercontent.com/ACDBio/AutoMR/b1f45c040b986488ff2a597bd2fac1bd4f564c62/ex/output/Anhedonia_twosample_forward.rds -------------------------------------------------------------------------------- /ex/output/Anhedonia_twosample_forward_signif.rds: -------------------------------------------------------------------------------- https://raw.githubusercontent.com/ACDBio/AutoMR/b1f45c040b986488ff2a597bd2fac1bd4f564c62/ex/output/Anhedonia_twosample_forward_signif.rds --------------------------------------------------------------------------------