#Title

Meta-analysis of menstrual disorders prevalence among medical students in Southeast Asia

1. Introduction

Menstrual disorders are highly prevalent among female medical students in Southeast Asia, potentially impacting academic performance and quality of life. This study aims to estimate the pooled prevalence of these disorders using a systematic meta-analysis approach. The analysis focuses on four key outcomes: 1. Overall Menstrual Disorders 2. Dysmenorrhea (Painful menstruation) 3. Irregular Menstrual Cycles 4. Premenstrual Syndrome (PMS) / PMDD

2. Methodology

2.1. Study Selection (PRISMA)

Description: The screening process followed PRISMA 2020 guidelines. A total of 19 studies involving 7,719 participants were finally included.

R Code (Flow Diagram):

grViz("digraph plot {
  node [shape=box, style=filled, fillcolor=White, fontname='Helvetica', fontsize=10]
  rec1 [label='Records identified\n(n = 520)']
  rec2 [label='Records screened\n(n = 480)']
  rec3 [label='Excluded\n(n = 400)']
  rec4 [label='Full-text assessed\n(n = 80)']
  rec5 [label='Excluded (reasons)\n(n = 61)']
  rec6 [label='Included in Meta-analysis\n(n = 19)']
  edge [arrowhead=vee]
  rec1 -> rec2; rec2 -> rec3 [label='Excluded']; rec2 -> rec4; rec4 -> rec5; rec4 -> rec6
}")

2.2. Sources and study selection

This systematic review and meta-analysis was conducted in accordance with a prospectively registered protocol in PROSPERO and is reported following the PRISMA 2020 guidelines. Eligible studies were observational analytical in design, including prospective and retrospective cohort studies, case–control studies, and cross-sectional studies, that reported the prevalence of menstrual disorders and/or associated factors among female undergraduate medical students.

2.3. Data extraction and management

Data extraction was performed independently by two reviewers using a standardized data extraction form. Extracted information included study characteristics, participant characteristics, definitions and measurement methods, and reported prevalence estimates. Risk of bias was assessed independently using JBI Critical Appraisal Checklists.

2.4. Statistical analysis

Meta-analyses were conducted to estimate pooled prevalence of overall menstrual disturbances and specific subtypes using random-effects models to account for anticipated between-study heterogeneity. Prevalence estimates were pooled with corresponding 95% confidence intervals (CI) using the inverse-variance method with Logit transformation (PLOGIT).Statistical heterogeneity was assessed using visual inspection of forest plots, Cochran’s Q test, and the \(I^2\) statistic (\(I^2 > 50\%\) indicated substantial heterogeneity). Subgroup analyses by country were conducted for the primary outcome when sufficient data were available. Publication bias was assessed for outcomes with at least ten included studies using funnel plot asymmetry and Egger’s regression test. All statistical analyses were performed using R software (version 4.x) and the meta package.

2.5. Analytical implementation in R

Data preparation and cleaning

file_path <- "C:\\Users\\Admin\\Documents\\NCKH JC\\Nghiên cứu survey\\MA_menstrual disorders prevalence.xlsx"

if(file.exists(file_path)){
  dat <- as.data.frame(readxl::read_xlsx(file_path))
} else {
  stop("File not found! Please check the path.")
}

dat$events <- as.numeric(trimws(dat$events))
dat$n <- as.numeric(trimws(dat$n))
dat <- dat %>% filter(!is.na(events), !is.na(n), n >= events, events >= 0, n > 0)

kable(table(dat$outcome), col.names = c("Outcome", "Frequency")) %>%
  kable_styling(full_width = F, bootstrap_options = "striped")
Outcome Frequency
dysmenorrhea 8
irregular_cycle 8
menstrual_disorder 19
pms_pmdd 6

Meta-analysis model specification

run_meta_prev<-function(dat,outcome_code){
d<-dat %>% filter(outcome == outcome_code)
if(nrow(d)<5)stop(paste("Too few studies for",outcome_code))
if(!"study_label"%in%names(d))if("study_id"%in%names(d))d$study_label<-d$study_id else stop("No study label")
m<-metaprop(event=events,n=n,studlab=study_label,data=d,sm="PLOGIT",method="Inverse",random=TRUE,common=FALSE,method.tau="DL",prediction=TRUE,backtransf=TRUE,add=0.5,allstudies=TRUE)
list(model=m,k=nrow(d))
}

res_rlkn<-run_meta_prev(dat,"menstrual_disorder")
res_dys<-run_meta_prev(dat,"dysmenorrhea")
res_irr<-run_meta_prev(dat,"irregular_cycle") 
res_pms<-run_meta_prev(dat,"pms_pmdd")

m_rlkn<-res_rlkn$model; m_dys<-res_dys$model; m_irr<-res_irr$model; m_pms<-res_pms$model

CALCULATE STATISTICS FOR REPORTING (MIN, MAX, EGGER)

eg <- metabias(m_rlkn, method.bias="linreg")
v <- plogis(m_rlkn$TE)*100; l <- plogis(m_rlkn$lower)*100; u <- plogis(m_rlkn$upper)*100
imin <- which.min(v); imax <- which.max(v)

cat(sprintf("POOLED: %.2f%% [95%%CI %.2f-%.2f] | Het: Q=%.2f, df=%d, p<0.001, I2=%.1f%%\n", plogis(m_rlkn$TE.random)*100, plogis(m_rlkn$lower.random)*100, plogis(m_rlkn$upper.random)*100, m_rlkn$Q, m_rlkn$df.Q, m_rlkn$I2*100))
## POOLED: 57.61% [95%CI 45.66-68.73] | Het: Q=1488.73, df=18, p<0.001, I2=98.8%
cat(sprintf("MIN: %s (%s) -> %.1f%% [95%%CI %.1f-%.1f]\n", m_rlkn$studlab[imin], m_rlkn$data$country[imin], v[imin], l[imin], u[imin]))
## MIN: Ngo et al. (2022) (Vietnam) -> 11.6% [95%CI 8.2-15.7]
cat(sprintf("MAX: %s (%s) -> %.1f%% [95%%CI %.1f-%.1f]\n", m_rlkn$studlab[imax], m_rlkn$data$country[imax], v[imax], l[imax], u[imax]))
## MAX: Situmorang et al. (2024) (Indonesia) -> 91.3% [95%CI 88.8-93.4]
cat(sprintf("EGGER: p=%.3f -> %s\n", eg$p.value, ifelse(eg$p.value>=0.05, "The results indicated no significant evidence of publication bias", "Bias FOUND")))
## EGGER: p=0.876 -> The results indicated no significant evidence of publication bias

After fitting the random-effects models, pooled prevalence estimates and heterogeneity statistics were obtained for each outcome. The fitted models were then used to generate forest plots to visually summarize individual study estimates, pooled effects, and between-study variability.

3. Results

3.1. Summary of Pooled PrevalenceDescription:

We synthesized data from all included studies. The pooled prevalence estimates, along with heterogeneity statistics (\(I^2\)) and p-values, are summarized in Table 1 below.

Table 1: Pooled prevalence of menstrual disorders among female medical students in SEA

# --- PHẦN TẠO BẢNG CHUẨN (WORD + HTML ĐỀU CHẠY TỐT) ---

# 1. Tạo dữ liệu cho bảng
mods <- list("Overall"=m_rlkn, "Dysmenorrhea"=m_dys, "Irregular"=m_irr, "PMS"=m_pms)
tbl_data <- purrr::imap_dfr(mods, function(m, l) {
  if(is.null(m)) return(NULL)
  data.frame(
    Outcome = l,
    Studies = m$k,
    Participants = format(sum(m$n), big.mark=","),
    `Prevalence (95% CI)` = sprintf("%.2f%% (%.2f-%.2f)", 
                                    plogis(m$TE.random)*100, 
                                    plogis(m$lower.random)*100, 
                                    plogis(m$upper.random)*100),
    `Heterogeneity (I2)` = sprintf("%.1f%%", m$I2*100),
    `P-value (Q)` = ifelse(m$pval.Q < 0.001, "< 0.001", sprintf("%.3f", m$pval.Q)),
    check.names = FALSE
  )
})

# 2. Vẽ bảng bằng Flextable (Siêu thích hợp cho Word)
ft <- flextable(tbl_data) %>%
  autofit() %>%
  theme_vanilla() %>%
  bold(part = "header") %>%  # Đậm tiêu đề
  bold(j = 1) %>%            # Đậm cột Outcome
  align(align = "center", part = "all") %>% # Căn giữa
  fontsize(size = 10, part = "all") %>%     # Cỡ chữ 10 cho gọn trong Word
  font(fontname = "Times New Roman", part = "all") # Font chuẩn báo cáo

ft # In bảng ra

Outcome

Studies

Participants

Prevalence (95% CI)

Heterogeneity (I2)

P-value (Q)

Overall

19

7,719

57.61% (45.66-68.73)

98.8%

< 0.001

Dysmenorrhea

8

3,519

77.36% (67.49-84.91)

96.8%

< 0.001

Irregular

8

3,845

30.92% (21.06-42.89)

98.0%

< 0.001

PMS

6

1,853

39.32% (23.00-58.42)

98.1%

< 0.001

The meta-analysis revealed a high burden of menstrual health issues among medical students. The pooled prevalence of overall menstrual disorders was 57.61% (95% CI: 45.66%–68.73%). Among specific subtypes, dysmenorrhea was the most common condition, with a prevalence of 77.36% (95% CI: 67.49%–84.91%), followed by PMS/PMDD (39.32%) and irregular menstrual cycles (30.92%). Given the substantial heterogeneity observed across all outcomes (\(I^2 > 96\%\)), random-effects models were applied, and subgroup analyses were conducted to explore potential sources of variation.

3.2. Primary Outcome:

Overall Menstrual Disorders

A total of 19 studies provided data on the prevalence of menstrual disorders. The pooled analysis showed a prevalence of 57.61% (95% CI 45.66%–68.73%). This shows that approximately 58% of the total population of included female medical students suffered from some form of menstrual disorder. The studies showed a high heterogeneity (\(Q=1488.73\), \(df=18\), \(p<0.001\), and \(I^2=98.8\%\)) (Figure 2). The prevalence estimates ranged widely across studies. The lowest prevalence was reported by Ngo et al. (2022) in Vietnam (11.6%; 95% CI 8.2%–15.7%), while the highest was reported by Situmorang et al. (2024) in Indonesia (91.3%; 95% CI 88.8%–93.4%). There was no evidence of publication bias found by the Egger test (\(p=0.876\)).

Figure 2. Forest plot of pooled prevalence of overall menstrual disorders

par(mar=c(5,6,4,2))

forest(m_rlkn, backtransf=TRUE, pscale=100, xlim=c(0,100), xlab="Prevalence (%)", 
         main="Pooled prevalence of menstrual disorders", 
         leftcols=c("studlab","event","n"), leftlabs=c("Study","Events","Total"), 
         rightlabs=c("Prevalence", "95% CI"), 
         overall=TRUE, print.prediction=TRUE, 
         fontsize=11, spacing=1.3, col.square = "dodgerblue4",col.square.lines = "dodgerblue4", col.inside = "black",  col.diamond = "seagreen", col.diamond.lines = "seagreen", col.predict = "firebrick")

Subgroup Analysis by Country

Students from Indonesia and Malaysia had higher prevalence rates of menstrual disorders (approximately 74-76%). In contrast, students from Thailand and Vietnam showed a relatively lower prevalence level (though Vietnam showed significant variation within studies). Finally, the prevalence varied significantly across different study settings, reflecting the influence of local academic environments (Figure 3).

Figure 3. Forest plot for comparing countries in terms of menstrual disorders prevalence

par(mar=c(5,4,4,2))
  cts <- unique(as.character(m_rlkn$data$country)); m_rlkn$data$country <- factor(m_rlkn$data$country, levels=c("Vietnam", sort(cts[cts!="Vietnam"])))
  forest(update(m_rlkn, byvar=m_rlkn$data$country), layout="JAMA", sortvar=TE, pscale=100, xlim=c(0,100), digits=1, xlab="Prevalence (%)", main="Pooled Prevalence of Menstrual Disorders by Country", leftcols=c("studlab","event","n"), leftlabs=c("Study","Events","Total"), rightcols=c("effect.ci","w.random","i2"), rightlabs=c("Prevalence (95% CI)","Weight","I2"), just.addcols="right", overall=TRUE, test.subgroup=TRUE, addrow.subgroups=TRUE, print.prediction=TRUE, col.square="navy", col.square.lines="navy", col.diamond="forestgreen", col.diamond.lines="forestgreen", col.predict="firebrick", fontsize=11, spacing=1.3)

Publication Bias Assessment

The publication bias was evaluated through the funnel plot and Egger’s test. The funnel plot (Figure 4) showed a symmetrical pattern , indicating no significant publication bias. This was supported by Egger’s test result (P = 0.876).

Figure 4. Funnel plot of included studies showing a symmetrical pattern including no publication bias

if(!is.null(m_rlkn) && m_rlkn$k >= 10) {
  cols <- c("gray95", "gray85", "gray75")
  funnel(m_rlkn, xlab="Logit Transformed Prevalence", ylab="Standard Error", studlab=FALSE, contour=c(0.9, 0.95, 0.99), col.contour=cols, pch=21, bg="navy", col="black", cex=1.3, lwd=1, lty.ref=2, col.ref="darkred", lwd.ref=2)
  legend("topright", legend=c("p < 0.10", "p < 0.05", "p < 0.01"), fill=cols, title="Significance Levels", bty="n", cex=0.8)
  title(main="Funnel Plot of Menstrual Disorders", sub="Egger's Test p-value = 0.876 (No evidence of publication bias)", col.main="black", col.sub="forestgreen", font.sub=3)
} else {
  plot(1, type="n", axes=FALSE, xlab="", ylab=""); text(1, 1, "Insufficient data for Funnel Plot")
}

3.3. Secondary Outcomes: Dysmenorrhea, Irregular Cycles, and PMS/PMDD

We identified 8 studies that reported dysmenorrhea with a random effect of pooled prevalence estimate of 77.36% (95% CI 67.49%-84.91%) (Figure 5). The prevalence estimates ranged from 39.7% to 91.3% and there was substantial heterogeneity among those estimates (Q=217.98, d.f.=7, p<0.001 and I2=96.8%). Egger’s test was not performed due to the limited number of studies (k < 10). We identified 8 studies that reported irregular menstrual cycles (Figure 6). The prevalence estimates ranged from 13.0% to 48.9%. The random effects of pooled prevalence estimate was 30.92% (95% CI 21.06%-42.89%) (Q=352.77, d.f.=7, p<0.001 and I2=98.0%). Egger’s test was not performed (k < 10). Overall prevalence of PMS / PMDD was 39.32% (95% CI 23.00%-58.42%), ranging from 11.6% to 84.9%. There was substantial heterogeneity among studies (Q=268.71, d.f.=5, p<0.001 and I2=98.1%) (Figure 7). Egger’s test was not performed (k < 10).

Figure 5. Forest plot of pooled prevalence of dysmenorrhea showed a significant effect of 77.36% (67.49%, 84.91%)

par(mar=c(5,6,4,2))
forest(m_dys, backtransf=TRUE, pscale=100, xlim=c(0,100), xlab="Prevalence (%)", main="Pooled prevalence of dysmenorrhea", leftcols=c("studlab","event","n"), leftlabs=c("Study","Events","Total"), rightlabs=c("Prevalence", "95% CI"), overall=TRUE, print.prediction=TRUE, fontsize=11, spacing=1.3, col.square = "dodgerblue4",col.square.lines = "dodgerblue4", col.inside = "black",  col.diamond = "seagreen", col.diamond.lines = "seagreen", col.predict = "firebrick")

Figure 6. Forest plot of pooled prevalence of irregular menstrual cycles showed a significant effect of 30.92% (21.06%, 42.89%)

par(mar=c(5,6,4,2))
  forest(m_irr, backtransf=TRUE, pscale=100, xlim=c(0,100), xlab="Prevalence (%)", main="Pooled prevalence of irregular cycles", leftcols=c("studlab","event","n"), leftlabs=c("Study","Events","Total"), rightlabs=c("Prevalence", "95% CI"), overall=TRUE, print.prediction=TRUE, fontsize=11, spacing=1.3,  col.square = "dodgerblue4",col.square.lines = "dodgerblue4", col.inside = "black",  col.diamond = "seagreen", col.diamond.lines = "seagreen", col.predict = "firebrick")

Figure 7. Forest plot of pooled prevalence of PMS / PMDD showed a significant effect of 39.32% (23.00%, 58.42%)

par(mar=c(5,6,4,2))
  forest(m_pms, backtransf=TRUE, pscale=100, xlim=c(0,100), xlab="Prevalence (%)", main="Pooled prevalence of PMS / PMDD", leftcols=c("studlab","event","n"), leftlabs=c("Study","Events","Total"), rightlabs=c("Prevalence", "95% CI"), overall=TRUE, print.prediction=TRUE, fontsize=11, spacing=1.3,col.square = "dodgerblue4",col.square.lines = "dodgerblue4", col.inside = "black",  col.diamond = "seagreen", col.diamond.lines = "seagreen", col.predict = "firebrick")

4. Discussion

This systematic review and meta-analysis provided a comprehensive estimation of menstrual disorders among female medical students in Southeast Asia. Based on 19 studies involving over 7,700 participants, the results indicate a high burden of menstrual dysfunction in this population. High prevalence of menstrual disorders The overall pooled prevalence of menstrual disorders was 57.61%. This figure suggests that more than half of female medical students experience some form of menstrual disturbance. This rate is relatively high compared to the general population reported in previous literature. The demanding nature of medical education—characterized by high academic stress, sleep deprivation, and irregular schedules—may disrupt the hypothalamic-pituitary-gonadal (HPG) axis, thereby contributing to these disorders. Specific burden of Dysmenorrhea and PMS Notably, dysmenorrhea was the most prevalent condition (77.36%), followed by PMS/PMDD (39.32%) and irregular cycles (30.92%). The extremely high rate of dysmenorrhea is concerning as it is a leading cause of short-term school absenteeism and reduced quality of life. The prevalence of PMS highlights the intersection between reproductive health and mental well-being, suggesting that psychological support should be integrated into student health services. Geographical Variations Subgroup analysis revealed significant geographical heterogeneity. Students from Indonesia and Malaysia reported higher prevalence rates compared to those in Vietnam and Thailand. These differences might be attributed to variations in academic curricula, cultural perceptions of menstruation, or willingness to report symptoms. Despite the lower pooled prevalence in Vietnam, the variation within Vietnamese studies suggests that local university environments play a significant role. Strengths and Limitations This study is strengthened by a rigorous search strategy and specific focus on medical students in Southeast Asia. However, the substantial heterogeneity (\(I^2 > 90\%\)) across all outcomes indicates that factors other than country (e.g., BMI, lifestyle, year of study) likely contribute to the variability. Additionally, most included studies were cross-sectional, preventing causal inferences between academic stress and menstrual health.

5. Conclusion

In conclusion, menstrual disorders are highly prevalent among female medical students in Southeast Asia, with dysmenorrhea affecting nearly three-quarters of the population. These findings underscore the need for medical schools to implement supportive health policies, including stress management programs, accessible gynecological care, and accommodations for students suffering from severe symptoms. Future research should focus on longitudinal designs to identify specific modifiable risk factors within the medical training environment.

`