RMT Behaviour Report

Author

Sarah Morris

Published

March 4, 2025

Overall Adoption Rates

Across the entire sample, only 14.6% of participants reported using RMT methods, indicating relatively low adoption regardless of gender. This aligns with Devroop and Chesky’s (2020) finding that despite growing evidence supporting the benefits of RMT for wind instrumentalists, implementation remains limited across the profession. Their survey of professional wind players found that while 78% were aware of potential respiratory training benefits, only 12% engaged in structured RMT programs.

This implementation gap may stem from several factors, including limited integration of sports science literature into music performance training, insufficient emphasis on physiological aspects in conservatory education, and the challenge of demonstrating immediate musical benefits from respiratory training.

Code
# Load necessary libraries
library(readxl)
library(tidyr)
library(stringr)
library(ggplot2)
library(dplyr)
library(stats)
library(cluster)
library(factoextra)
library(broom)
library(rstatix)
library(rpart)
library(rpart.plot)
library(knitr)

# Read the Excel file from the 'Combined' sheet and convert to a data frame
data_combined <- read_excel("../Data/R_Import_Transformed_15.02.25.xlsx", sheet = "Combined")

df <- as.data.frame(data_combined)

# Read the qual_extDevice sheet from the Excel file
df_qual <- read_excel("../Data/R_Import_Transformed_15.02.25.xlsx", sheet = "qual_extDevice")

1 *RMT Methods Used

Code
## Data preparation -----------------------------------------------------------
# Check if RMTMethods column exists
if(!'RMTMethods' %in% names(df)){
  stop("The column 'RMTMethods' is not found in the dataframe.")
}

# Split the comma-separated values and process the data
rmt_split <- strsplit(as.character(df$RMTMethods), ",\\s*")
rmt_unlist <- unlist(rmt_split)
rmt_counts <- table(rmt_unlist)
rmt_df <- as.data.frame(rmt_counts)
colnames(rmt_df) <- c("Method", "Count")

# Remove any empty or NA values
rmt_df <- rmt_df[!is.na(rmt_df$Method) & rmt_df$Method != "", ]

# Calculate total responses and participants
total_responses <- sum(rmt_df$Count)
total_participants <- nrow(df)  # Number of participants

# Perform chi-square test for equal proportions
chi_test <- chisq.test(rmt_df$Count)
print(chi_test)

    Chi-squared test for given probabilities

data:  rmt_df$Count
X-squared = 918.04, df = 3, p-value < 2.2e-16
Code
## 1. Frequency Tables -----------------------------------------------------------

# Frequency table based on responses
frequency_table_responses <- rmt_df %>%
  arrange(desc(Count)) %>%
  mutate(
    Percentage = (Count / total_responses) * 100,
    RelativeFreq = Count / total_responses,
    CumulativeFreq = cumsum(Count),
    CumulativePercentage = cumsum(Count) / total_responses * 100
  )

# Frequency table based on participants
frequency_table_participants <- rmt_df %>%
  arrange(desc(Count)) %>%
  mutate(
    Percentage = (Count / total_participants) * 100,
    RelativeFreq = Count / total_participants,
    CumulativeFreq = cumsum(Count),
    CumulativePercentage = cumsum(Count) / total_participants * 100
  )

# Print frequency table based on responses
cat("\n\n========== FREQUENCY DISTRIBUTION BASED ON RESPONSES ==========\n")


========== FREQUENCY DISTRIBUTION BASED ON RESPONSES ==========
Code
cat(paste("Total Responses: ", total_responses, "\n\n"))
Total Responses:  2375 
Code
print(kable(
  frequency_table_responses, 
  col.names = c("RMT Method", "Frequency", "Percentage (%)", "Relative Frequency", 
                "Cumulative Frequency", "Cumulative Percentage (%)"),
  caption = paste("Frequency Distribution of RMT Methods (N =", total_responses, "responses)"),
  digits = 2,
  format = "simple"
))


Table: Frequency Distribution of RMT Methods (N = 2375 responses)

RMT Method         Frequency   Percentage (%)   Relative Frequency   Cumulative Frequency   Cumulative Percentage (%)
----------------  ----------  ---------------  -------------------  ---------------------  --------------------------
With instrument         1136            47.83                 0.48                   1136                       47.83
With body                731            30.78                 0.31                   1867                       78.61
No RMT                   280            11.79                 0.12                   2147                       90.40
With device              228             9.60                 0.10                   2375                      100.00
Code
cat("\nNote: Percentages represent the proportion of total responses. The sum of percentages equals 100%.\n")

Note: Percentages represent the proportion of total responses. The sum of percentages equals 100%.
Code
# Print frequency table based on participants
cat("\n\n========== FREQUENCY DISTRIBUTION BASED ON PARTICIPANTS ==========\n")


========== FREQUENCY DISTRIBUTION BASED ON PARTICIPANTS ==========
Code
print(kable(
  frequency_table_participants, 
  col.names = c("RMT Method", "Frequency", "Percentage (%)", "Relative Frequency", 
                "Cumulative Frequency", "Cumulative Percentage (%)"),
  caption = paste("Frequency Distribution of RMT Methods (N =", total_participants, "participants)"),
  digits = 2,
  format = "simple"
))


Table: Frequency Distribution of RMT Methods (N = 1558 participants)

RMT Method         Frequency   Percentage (%)   Relative Frequency   Cumulative Frequency   Cumulative Percentage (%)
----------------  ----------  ---------------  -------------------  ---------------------  --------------------------
With instrument         1136            72.91                 0.73                   1136                       72.91
With body                731            46.92                 0.47                   1867                      119.83
No RMT                   280            17.97                 0.18                   2147                      137.80
With device              228            14.63                 0.15                   2375                      152.44
Code
cat("\nNote: % represent the proportion of participants who selected each method.\n")

Note: % represent the proportion of participants who selected each method.
Code
cat("Since participants could select multiple methods, % may exceed 100%.\n")
Since participants could select multiple methods, % may exceed 100%.
Code
## 2. Plots -----------------------------------------------------------

# Create dataframes for plotting
# First for percentage of responses
rmt_df_responses <- rmt_df %>%
  arrange(desc(Count)) %>%
  mutate(Percentage = (Count / total_responses) * 100,
         label = sprintf("%d\n(%.1f%%)", Count, Percentage))

# Second for percentage of participants - THIS IS THE CORRECTED CODE
rmt_df_participants <- rmt_df %>%
  arrange(desc(Count)) %>%
  mutate(Percentage = (Count / total_participants) * 100,  # Changed from total_responses to total_participants
         label = sprintf("%d\n(%.1f%%)", Count, Percentage))

# Create the first plot (percentage of responses)
p1 <- ggplot(rmt_df_responses, aes(x = reorder(Method, -Count), y = Count)) +
  geom_bar(stat = "identity", fill = "steelblue") +
  theme_minimal() +
  labs(title = "RMT Methods Used by Wind Instrumentalists",
       subtitle = paste("% of total responses (N =", total_responses, ")"),
       caption = "Note: % = 100% of all responses",
       x = "Method",
       y = "Count") +
  theme(axis.text.x = element_text(angle = 45, hjust = 1),
        plot.margin = margin(t = 20, r = 20, b = 20, l = 20, unit = "pt")) +
  geom_text(aes(label = label), vjust = -0.5, size = 3.5, lineheight = 0.8) +
  coord_cartesian(clip = "off") +  # Prevent label clipping
  scale_y_continuous(expand = expansion(mult = c(0, 0.2)))  # Add extra space at the top

# Create the second plot (percentage of participants)
p2 <- ggplot(rmt_df_participants, aes(x = reorder(Method, -Count), y = Count)) +
  geom_bar(stat = "identity", fill = "coral") +
  theme_minimal() +
  labs(title = "",
       subtitle = paste("% of total participants (N =", total_participants, ")"),
       caption = "Note: % >100% - could select multiple methods",
       x = "Method",
       y = "Count") +
  theme(axis.text.x = element_text(angle = 45, hjust = 1),
        plot.margin = margin(t = 20, r = 20, b = 20, l = 20, unit = "pt")) +
  geom_text(aes(label = label), vjust = -0.5, size = 3.5, lineheight = 0.8) +
  coord_cartesian(clip = "off") +  # Prevent label clipping
  scale_y_continuous(expand = expansion(mult = c(0, 0.2)))  # Add extra space at the top

# Print plots
cat("\n\n========== VISUALIZATIONS ==========\n")


========== VISUALIZATIONS ==========
Code
print(p1)

Code
print(p2)

Code
# Optional: Create a side-by-side plot using the patchwork package
# If patchwork is not installed, uncomment the next line
# install.packages("patchwork")

library(patchwork)
combined_plot <- p1 + p2 + plot_layout(ncol = 2)
print(combined_plot)

1.1 Analyses Used

The current study employed descriptive and inferential statistical methods to analyze the prevalence and distribution of respiratory muscle training (RMT) methods among wind instrumentalists. The following analyses were conducted:

  1. Frequency Distribution Analysis: Calculated the count and percentage of each RMT method used by wind instrumentalists in the sample.

  2. Chi-Square Test for Equal Proportions: Applied to determine whether the observed differences in the distribution of RMT methods were statistically significant or due to random chance.

  3. Visualization: Created graphical representations of the data to facilitate interpretation of the findings.

1.2 Analysis Results

Frequency Distribution of RMT Methods

  1. Frequency Distribution Based on Total Responses (N = 2375)
RMT Method Frequency Percentage (%) Relative Frequency Cumulative Frequency Cumulative Percentage (%)
With instrument 1136 47.83 0.48 1136 47.83
With body 731 30.78 0.31 1867 78.61
No RMT 280 11.79 0.12 2147 90.40
With device 228 9.60 0.10 2375 100.00

Note: Percentages represent the proportion of total responses. The sum of percentages equals 100%.

  1. Frequency Distribution Based on Total Participants (N = 1558)
RMT Method Frequency Percentage (%) Relative Frequency Cumulative Frequency Cumulative Percentage (%)
With instrument 1136 72.91 0.73 1136 72.91
With body 731 46.92 0.47 1867 119.83
No RMT 280 17.97 0.18 2147 137.80
With device 228 14.63 0.15 2375 152.44

Note: Percentages represent the proportion of participants who selected each method. Since participants could select multiple methods, the sum of percentages exceeds 100%.

Key Findings

  1. Instrument-based RMT dominates: Nearly three-quarters (72.91%) of all participants report using their instrument for respiratory muscle training, making it by far the most prevalent method.

  2. Body-based techniques are common: Almost half (46.92%) of participants use body-based RMT techniques, making it the second most popular approach.

  3. Limited use of devices: Only 14.63% of participants report using dedicated devices for RMT, suggesting potential barriers to device adoption or lower perceived effectiveness.

  4. Multiple method usage: The total percentage across all methods (152.44% of participants) indicates that many wind instrumentalists employ multiple RMT strategies simultaneously.

  5. Some report no RMT: A notable minority (17.97%) of participants report using no respiratory muscle training at all.

Chi-Square Test Results

A chi-square test for equal proportions was conducted to determine if the frequencies of different RMT methods were significantly different from what would be expected if all methods were equally prevalent:

Chi-squared test for given probabilities
X-squared = 918.04, df = 3, p-value < 2.2e-16

The extremely low p-value (p < 0.001) indicates that the observed differences in the distribution of RMT methods are highly statistically significant and not due to random chance.

2 *RMT Binary Responses

Code
## Descriptive stats -----------------------------------------------------------
# Create a frequency table for the RMTMethods_YN variable
freq_table <- table(df$RMTMethods_YN)
freq_df <- as.data.frame(freq_table)
names(freq_df) <- c("RMTMethods_YN", "Count")

# Compute percentage
freq_df <- freq_df %>%
  mutate(Percentage = Count / sum(Count) * 100)

# Total sample size
total_n <- sum(freq_df$Count)

# Create a label that shows both count and percentage
freq_df <- freq_df %>%
  mutate(label = sprintf("%d\n(%.1f%%)", Count, Percentage))

## Significance testing --------------------------------------------------------
# Chi-Square Test for Proportions
expected_proportions <- rep(1/length(freq_table), length(freq_table))  # Equal expected proportions
expected_counts <- total_n * expected_proportions

# Chi-square test comparing observed frequencies to expected frequencies
chi_test <- chisq.test(x = as.vector(freq_table), p = expected_proportions)

# Print chi-square test results to the console
print(chi_test)

    Chi-squared test for given probabilities

data:  as.vector(freq_table)
X-squared = 779.46, df = 1, p-value < 2.2e-16
Code
# Visualisation ----------------------------------------------------------------
# Create the bar plot with count on the y-axis (+ total N in the y-axis label)
plot_title <- "Distribution of Binary RMT Responses (Y/N)"

p <- ggplot(freq_df, aes(x = factor(RMTMethods_YN), y = Count)) +
  geom_bar(stat = "identity", fill = "steelblue", width = 0.7) +
  geom_text(aes(label = label), vjust = -0.5, size = 4) +
  labs(title = plot_title,
       x = "RMTMethods_YN",
       y = sprintf("Count (Total N = %d)", total_n)) +
  theme_minimal() +
  theme(
    plot.title = element_text(hjust = 0.5, size = 14, face = "bold"),
    axis.title = element_text(size = 12),
    axis.text = element_text(size = 10)
  ) +
  scale_y_continuous(expand = expansion(mult = c(0, 0.2)))

# Display the plot
print(p)

2.1 Analyses Used

This analysis was conducted to investigate the prevalence and patterns of RMT use as binary categories (i.e., uses RMT vs. does not use RMT). The primary analytical approach utilized was:

Chi-Square Goodness-of-Fit Test: This non-parametric test was applied to determine whether the observed frequency distribution of RMT adoption among wind instrumentalists differs significantly from what would be expected under a null hypothesis of equal probability. The chi-square test assesses whether observed frequency differences are statistically significant or could have occurred by random chance. The statistical significance of the resulting chi-square value was evaluated at the conventional alpha level of 0.05.

2.2 Analysis Results

The chi-square test for goodness-of-fit yielded the following results:

Chi-squared test for given probabilities
X-squared = 779.46, df = 1, p-value < 2.2e-16

The extremely small p-value (p < 2.2e-16) indicates that the observed distribution is significantly different from the expected distribution under the null hypothesis. The large chi-square value (779.46) with only 1 degree of freedom further demonstrates the substantial deviation from expected frequencies. The data indicate a significant disparity in the distribution of RMT practice adoption among wind instrumentalists.

2.3 Result Interpretation

Prevalence of RMT Methods

Instrument only

These findings demonstrate a clear hierarchy in the adoption of RMT methods among wind instrumentalists. Not only was there a large majority (85%) who did not use RMT devices in the binary category analysis, but there was also an overwhelming preference for instrument-based RMT (72.9%). The latter closely aligns with Pecen et al (1016) who highlight that musicians tend to prioritize high practice volume on their instrument, sometimes neglecting other important physical and psychological fundamentals. Their study noted that musicians may view activities not directly perceived as traditional practice—such as physical exercise or rest—as a waste of practice time, emphasizing the ingrained culture of striving for high practice volume on the instrument itself. Similarly, Clark and Lisboa (2013) discuss that young musicians typically receive training focused on the mechanics of playing their instrument, including technical and artistic skills, but often lack formal instruction in effective practice methods or broader performance-related skills until tertiary education. This suggests an emphasis on instrument-specific practice early on, with less integration of complementary skills or health-promoting techniques during initial training stages. This preference likely stems from the specificity principle in motor learning and physiological adaptation, which suggests that training is most effective when it closely resembles the target activity (Borresen & Lambert, 2009). However, it is also worth noting that the effectiveness of performance-specific training has also been found to vary between individuals. For musicians, this might mean that some players could benefit from modalities for practicing that are similar, but not identical, such as respiratory muscle training, or embouchure contractions around non-instrument appartus.

Respiratory muscle training (RMT) using a wind instrument itself, as opposed to supplementary external devices like threshold loaders or resistive trainers, may offer several unique benefits for wind instrumentalists grounded in the specific physiological and musical demands of playing.These benefits were discussed extensively in a study assisting the ‘effects of RMT on respiratory function and musical paramters in saxophone players’ conducted by Dries and colleagues in 2017. Firstly, playing a wind instrument inherently involves overcoming the instrument’s resistance, which acts as a continuous form of respiratory muscle training. For example, saxophone players must generate pressures up to approximately 60% to 89% of their maximum expiratory pressure, depending on gender, which corresponds to strength and endurance training levels (Dries 2017 page 4). This natural resistance during actual playing conditions provides a task-specific training stimulus that directly targets the respiratory muscles in the context of musical performance, potentially leading to more relevant strength and endurance gains than generic external devices. Secondly, the holistic nature of playing a wind instrument integrates respiratory muscle use with the coordination of airflow, embouchure, posture, and sound production. Musicians assess their technique based on the resulting sound and haptic feedback, emphasizing the cooperation of the entire playing apparatus rather than isolated muscle groups (Dries 2017 page 3). This integrated approach may enhance motor learning and respiratory muscle recruitment patterns that are specific to musical demands, which external devices may not replicate. Moreover, studies have shown that respiratory muscle strength improvements from playing wind instruments are accompanied by changes in musical parameters such as timbre and airflow control, indicating functional transfer to performance (Dries 2017 page 12). In contrast, while external devices improve muscle strength and endurance, their direct impact on musical performance parameters is less established. Additionally, the use of the instrument for RMT may improve respiratory awareness and breathing technique in a contextually meaningful way. Wind musicians develop superior respiratory awareness through experience gained during playing, which may not be as effectively cultivated through isolated device training (Dries 2017 page 14). Finally, practical considerations such as adherence and motivation may favor instrument-based training. Participants in RMT programs using external devices sometimes report difficulty adhering to training protocols due to effort or monotony (Dries 2017 page 8). Training through actual instrument playing may be more engaging and musically rewarding, potentially improving compliance.

Several studies have also discussed particular adherence to traditional pedagogical approaches that emphasize instrument-specific technique development, as well as the historical emphasis in music conservatoriums on “learning through playing” rather than supplementary physiological training. Skyring, A. (2019) highlights that many teachers in conservatoire settings tend to adopt a predominantly didactic, teacher-centered pedagogical style (referred to as “Type 2: transfer pedagogy”) characterized by instruction, scaffolding that promotes mimicry, and a focus on specific technical tasks and assessment outcomes. This approach reflects a strong emphasis on instrument-specific technique development and a predefined notion of excellence, with less flexibility or contextualization of learning (Skyring, 2019 page 44 - 45). Similarly, Young et al. (2003) discusses the historical dominance of the “instrumental-technical” approach in music education, which focuses on the physical mechanics of playing and accurate reproduction of the teacher’s instructions and score markings. This approach aligns with the master-apprentice model and prioritizes technical skill acquisition over broader musical understanding or physiological considerations. The document contrasts this with more student-led, exploratory pedagogies that are less prevalent historically (page 5 - 14). Clark & Lisboa (2013) notes that early musical training programs often concentrate heavily on technical training specific to the instrument, with limited formal instruction in effective practice methods, performance-related skills, or techniques promoting long-term physical and mental health. They also point out that only at the tertiary conservatoire or university level do students typically begin to receive more comprehensive, multi-faceted training that may include health and well-being support, indicating a historical gap in supplementary physiological training during earlier stages (Clark & Lisboa (2013) page 15 - 36). These findings collectively indicate that formally trained musicians and conservatoires have traditionally emphasized instrument-specific technique development and “learning through playing,” with less attention historically given to supplementary physiological training or broader pedagogical approaches.

Finally There is evidence that playing wind instruments itself acts as a form of respiratory muscle training. Playing wind instruments requires strong and controlled use of respiratory muscles, particularly the diaphragm, and is considered a form of continuous respiratory muscle training. Studies show that wind instrumentalists, regardless of the specific instrument, tend to have higher maximum inspiratory and expiratory pressures than non-players, suggesting that the act of playing itself provides significant respiratory training benefits (Hatziagorou et al., 2018; Antoniadou et al., 2012; Khuje & Hulke, 2011). Despite RMT being a beneficial form of supplementary training in other athlete populations (Illi et al., 2012; HajGhanbari et al., 2013; Fernández-Lázaro et al., 2022; Sales et al., 2016; Subramanian & Goyal, 2025), there is still only a handful of studies demonstrating benefits in wind instrumentalists, most of which exhibit poor design and report tendencies. Given that training solely on an instrument offers clear performance and physiological benefits (Rekha et al., 2021; Hatziagorou et al., 2018; Antoniadou et al., 2012; Khuje & Hulke, 2011), it may take substantially more supporting evidence and improved device accessibility for RMT to be more readily assimilated into practice.

In summary, respiratory muscle training using the wind instrument itself offers task-specific resistance training, integrates respiratory function with musical performance, enhances respiratory awareness in a relevant context, and may improve adherence, making it a beneficial approach for wind instrumentalists compared to supplementary external devices.

Body only

A substantial proportion of the sample (30.78%) used body-based breathing exercises and somatic techniques to enhance respiratory function and overall performance. These may include the Alexander Technique, Feldenkrais Method, Body Mapping, yoga breathing, and dynamic somatic exercises such as those found in the Breathing Gym. These methods focus on improving posture, movement efficiency, respiratory muscle strength, and breath control, and are not only crucial for sound production but also offer several evidence-based benefits, including improved pulmonary function and reduced risk of respiratory issues (Natanblut, 2011; Meitlis, 2015; Macleod, 2023; Baadjou et al., 2017). This leads to more efficient air support, better breath control, and increased endurance during performance (Rennie-Salonen & Villiers 2016 page 13; Salonen 2018 page 135; Lyn & Michelle 2022 pages 1 - 3). Studies report that, for example, the Alexander Technique and yoga contribute to greater postural stability and comfort (Natanblut, 2011; Macleod, 2023), while body–mind approaches support tone production during technically demanding passages (Kelley, “Integrating Body and Mind Awareness”). Overall, physiological and performance benefits that vary with technique and instrument type.

Breathing Techniques

Relaxation Breathing Exercises: These exercises are designed to mitigate stress and improve lung function, particularly beneficial for asthmatic wind instrumentalists. They help in reducing asthma symptoms by promoting relaxation and reducing tension in the respiratory muscles (Eckert, 2019).

Maximum Expansion and Contraction Breathing: Although the effectiveness of these exercises is inconclusive, they are intended to enhance lung capacity and control by pushing the limits of respiratory expansion and contraction (Eckert, 2019).

Controlled Breathing: Techniques such as diaphragmatic breathing are emphasized for their role in improving breath control and efficiency, which are essential for sustaining long musical phrases (Trongone, 1948). Body and mind awareness techniques supported improved tone production during challenging passages (Kelley, “Integrating Body and Mind Awareness”).

Combination strategies: Diaphragm mobilization combined with muscle stretching improved sound quality and duration in oboists (Balode and Galeja, 2019), and flute‐specific “breath support” technique produced higher rib cage volume with better control of mouth pressure (Cossette et al., 2010).

Body-Based Breathing and Somatic Techniques

Alexander Technique (AT) is a psychophysical method aimed at re-educating habitual movement patterns to improve posture, neuromuscular coordination, breathing efficiency, and pitch accuracy (Soares, 2013). It emphasizes releasing tension in the head, neck, and spine, facilitating spinal decompression and better musculoskeletal use during movement and stationary postures. Musicians practicing AT report benefits including pain-free playing, reduced tension, increased calm, better concentration, and musical improvements such as enhanced tone, articulation, and intonation (Rennie-Salonen & Villiers 2016 page 13; Salonen 2018; Natanblut, 2011; Skyring 2019 page 43). The Alexander Technique’s focus on releasing tension in the head, neck, and spine also facilitates easier breathing and improved neuromuscular coordination, enhancing tone production and articulation in wind playing (Rennie-Salonen & Villiers 2016 page 13; Salonen 2018 page 135).

Feldenkrais Method (FM) involves group classes (“Awareness Through Movement”) and individual sessions (“Functional Integration”) that promote sensorimotor and proprioceptive retraining through slow, exploratory movements. FM helps musicians identify and adjust inefficient or injurious movements, improving postural integration and movement awareness, which supports efficient breathing mechanics (Rennie-Salonen & Villiers 2016 page 13; Salonen 2018 page 138). Although there are few studies involving wind instrumentalists, the Feldenkrais Method has been noted to contribute to more expressive performance in singers (Meitlis, 2015).

Body Mapping (BMG) is a somatic education method specifically designed for musicians and involves understanding and optimizing body posture to prevent strain and improve sound quality. It helps musicians maintain proper alignment and reduce the risk of musculoskeletal injuries (Bellisle & Decker, 2017). It applies structural anatomy knowledge to playing instruments and singing, aiming to prevent injury and improve performance by correcting inaccurate sensorimotoe (i.e., body) maps that lead to inefficient movement (Rennie-Salonen & Villiers 2016; Salonen 2018). This correction of ‘inaccurate body schemas’ may indirectly support respiratory function by optimizing posture and movement patterns (Rennie-Salonen & Villiers 2016 page 13; Salonen 2018 page 140).

Yoga Breathing and related somatic exercises are recognized for improving body awareness, respiratory regulation, and injury prevention. While yoga’s direct impact on respiratory capacity in musicians is less emphasized, it influences breathing patterns and relaxation, supporting performance quality (Salonen 2018; Lyn & Michelle 2022). Yoga practice has demonstrated effectiveness in reducing pain and tension, particularly among brass players (Macleod, 2023; Bulla Ariza, 2018). These methods may reduce ventilatory responses and support respiratory regulation, although their direct effect on lung function requires further study (Lyn & Michelle 2022 page 1 - 3).

Dynamic Breathing Exercises (Breathing Gym) use body movements and imagery to encourage efficient breathing. For example, exercises mimic the muscular effort of an archer for fortissimo breaths, throwing darts for mezzo forte, and floating paper airplanes for piano breathing. These exercises train different breath intensities and support respiratory control in brass players (Pheiffer 2008 page 71).

Proper posture is crucial for effective breath control and sound production. Musicians are taught to maintain an optimal body position to facilitate better airflow and reduce physical strain (Bellisle & Decker, 2017) e.g., a standing posture is associated with higher abdominal muscle activation compared to sitting postures (Ackermann et al., 2014).

Popularity and Incorporation into Practice

These somatic and breathing techniques are increasingly integrated into musicians’ occupational health education and training programs, especially at tertiary education levels. Tertiary music students receive somatic education classes on Alexander Technique, Pilates, and Body Mapping on a rotational basis each semester, indicating institutional adoption and practical application ( Rennie-Salonen & Villiers 2016; Salonen 2018). Workshops and group classes incorporating these methods are often conducted with volunteer musicians, demonstrating practical use beyond theory. Such sessions have shown improvements in posture, body awareness, and musical performance, confirming their active role in musicians’ training (Lee, Morris & Nicosia 2020).

In summary, these body-based breathing and somatic methods are popular among musicians, especially in tertiary education settings where they are incorporated into occupational health and wellness programs. Their practical application has been shown to improve respiratory performance, reduce tension, and enhance overall musical expression in wind instrumentalists. However, it is important to note that many studies had methodological limitations, including small sample sizes or lack of control groups. The diversity of techniques and outcomes measured makes direct comparisons challenging, suggesting the need for more standardized research approaches in future studies. Even without consideration of these inconsistencies, there is a lack of peer reviewed evidence for these methods, which rely quite heavily on anecdotal evidence and teacher promotion.

RMT Devices

The relatively low adoption of device-based RMT (9.60%) in this study contradicts some literature that suggests specialized respiratory training devices can significantly improve respiratory muscle function (Sapienza et al., 2011). This discrepancy may reflect limited awareness or accessibility of these devices within musical communities.

Device Ooptions and Basic Mechanics

Respiratory Muscle Training (RMT) devices vary in design and function, typically categorized into threshold-loaded devices, resistive trainers, and pressure relief valve systems. Threshold-loaded devices require the user to generate a preset inspiratory or expiratory pressure to open a valve, providing consistent and quantifiable resistance throughout the breath. Resistive trainers impose a variable resistance based on airflow, often perceived as less consistent but allowing for dynamic breathing patterns. Pressure relief valve systems, such as those described by Sapienza & colleagues (2002), use an adjustable spring-loaded valve that remains closed until a specific pressure is generated.

Training Methods

Inspiratory Muscle Resistive Training:

This method involves breathing against resistance, which strengthens the inspiratory muscles by overloading them, similar to weight training for skeletal muscles. It has been shown to improve respiratory muscle strength and endurance, which can enhance the ability of wind instrumentalists to sustain notes and control dynamics more effectively(Verges, 2019) (Göhl et al., 2016). IMT uses threshold devices (e.g., POWERBreathe) to strengthen inspiratory muscles through resistance breathing exercises (Nicoara Rares 2021; Ibanez-Pegenaute 2024).

Isocapnic Hyperpnea Training:

This technique involves breathing at a high rate and volume while maintaining normal carbon dioxide levels, which enhances both the strength and endurance of the respiratory muscles. It is particularly beneficial for improving overall respiratory function and exercise capacity, which can translate to better breath control and stamina during performances(Verges, 2019) (Göhl et al., 2016).

Expiratory Muscle Strength Training (EMST):

EMST focuses on increasing the maximum expiratory pressure (MEP), which is crucial for wind instrumentalists who need to generate sufficient pressure to play their instruments. A study involving collegiate wind instrumentalists showed significant improvements in MEP after four weeks of EMST, although direct improvements in musical performance were not conclusively demonstrated(Woodberry et al., 2016). EMST focuses on strengthening expiratory muscles using devices set to a percentage of maximum expiratory pressure (Woodberry 2016; Sapienza 2002).

Combined Programs:

Some interventions combine wind instrument performance with choral or vocal training for broader respiratory and psychological benefits (Kim Byeong 2024).

Benefits for Wind Instrumentalists

A variety of respiratory muscle training methods—including wind instrument practice, device-based inspiratory and expiratory training, and vocal techniques—offer clear benefits for wind instrumentalists. These methods strengthen respiratory muscles, improve lung function, and enhance musical performance, making them valuable tools for both health and artistry.Such benefits are listed below.

Increased Respiratory Muscle Strength: Both inspiratory and expiratory muscle strength are significantly improved, leading to better breath support and control (Rekha 2021; Nicoara Rares 2021; Ibanez-Pegenaute 2024; Sapienza 2002; hatziagorou 2018; Yilmaz 2020; Dries et al. 2017). Threshold devices such as the POWERbreathe and EMST150 yield increased respiratory muscle strength and improved lung function (Nicoară and Monea, 2021; Türk-Espitalier et al., 2024). Controlled trials with saxophone and trumpet players report measurable gains in muscle strength or maximal expiratory pressure (Dries et al., 2017), while the regular use of a Breath Builder device enhanced maximal inspiratory pressure (Mazon, 2009). Several studies using expiratory training methods—most notably with EMST150 devices—reported increased maximal expiratory pressure (for example, a 13% increase was noted in trumpet players) and observations that regular wind playing is linked to higher expiratory strength.

Improved Lung Function: Increases in forced vital capacity (FVC), forced expiratory volume (FEV1), and maximum voluntary ventilation are observed, supporting longer and more controlled playing (Rekha 2021; Nicoara Rares 2021; Ibanez-Pegenaute 2024; Yilmaz 2020; Dries et al. 2017). The use of specific devices like POWERBreathe showed improvements in lung function (Nicoară and Monea, 2021).

Better Airflow and Pressure Generation: Training leads to higher maximum inspiratory and expiratory pressures, which are crucial for producing and sustaining sound on wind instruments (Woodberry 2016; Ibanez-Pegenaute 2024; Sapienza 2002; Hatziagorou 2018). These devices offer targeted strengthening of inspiratory and expiratory muscles, which are critical for overcoming instrument resistance and controlling airflow during performance.

Additional Benefits: Some programs also report reduced dyspnea (breathlessness), improved stress levels, and enhanced quality of life, especially when combined with choral activities (Rekha 2021; Kim 2024).

Better breath control: Enhanced respiratory muscle strength and endurance can lead to improved breath control, allowing for more precise modulation of airflow and pressure, which is essential for high-quality musical performance (Morris et al., 2023).

And ultimately, enhanced musical performance: Empirical studies assessing RMT effects in wind instrumentalists have demonstrated measurable improvements in respiratory muscle strength and endurance, alongside enhancements in musical parameters. RMT can increase sound duration, pitch range, and sound stability. Brass players, for example, show improved high-note performance, while woodwind players achieve greater sound stability (Nunes de Sa 2025; Yilmaz 2020). Improvements in lung capacity and breathe control over long phrases, may contribute to a more consistent and powerful sound (Cossette et al., 2010). For example, the Powerlung® device used in saxophone players combines inspiratory and expiratory muscle training with threshold loading, resulting in significant increases in maximal inspiratory pressure (MIP) and maximal expiratory pressure (MEP), as well as improvements in peak inspiratory and expiratory flow rates (Dries et al. 2017 page 2, 8). Such physiological enhancements translate into altered airflow dynamics and changes in instrument timbre, indicating functional benefits relevant to musical performance. Similarly, Yilmaz et al. reported that a 4-week RMT intervention in brass players and singers led to significant increases in pulmonary function tests and respiratory muscle strength, with notable improvements in pitch range and phonation duration (Yilmaz et al. 2020 page 1 - 6, 7). The implications of these findings for wind instrumentalists are substantial. Enhanced respiratory muscle function can improve breath control, endurance, and the ability to sustain challenging passages, potentially reducing fatigue and injury risk. Moreover, the integration of RMT into musicians’ training regimens may foster greater respiratory awareness and technique refinement, contributing to overall musical expression and performance quality.

Current Applications

Currently, RMT is increasingly incorporated into contemporary wind instrumentalists’ practice, particularly within tertiary music education and professional development programs. These programs often include somatic and breathing techniques alongside RMT to address occupational health and wellness, emphasizing the practical application of respiratory training to optimize performance and reduce musculoskeletal tension (Yilmaz et al. 2020 page 6, 7; Dries et al. 2017 page 2, 8). The use of task-specific devices that simulate the resistance encountered during actual playing is favored to ensure relevance and adherence, as instrument-based training may be more engaging and directly transferable to performance demands (Dries et al. 2017 page 3; Sapienza et al. 2002 page 2).

In summary, a range of RMT devices is available that can be tailored to the specific respiratory demands of wind instrumentalists. Studies consistently show that RMT enhances respiratory muscle strength and endurance, with positive effects on musical parameters such as pitch range, phonation duration, and timbre. The integration of RMT into contemporary wind musicians’ training reflects its recognized value in supporting respiratory function, performance quality, and occupational health. While RMT offers clear benefits in terms of respiratory muscle function, its direct impact on musical performance remains a topic of ongoing research. Some studies suggest that while RMT can improve physiological parameters like MEP and inspiratory pressures, translating these improvements into enhanced musical performance requires further exploration. It is worth noting that although RMT methods are currently the most supported, evidence-based supplementary training methods available for wind instrumentalists, there is still no clear concensus on whether these methods are universally effective. It is also worth noting that strengthing of the respiratory muscles may translate to a higher demand placed on the facial muscles, since these muscles are responsible for funneling the generated output into the instrument. While this should, theoretically lead to an easier production of high and loud notes, concurrent embouchure training may be necessary to reduce injury or strain caused by the increase in pressure being handled by the facial muscles.

No RMT

Notably, 11.79% of wind instrumentalists engage in no formal RMT. Although this has been scarcely documented in the literature, this finding is supported by Dries et al. (2017) who reported on a survey where some participants did not engage in any form of respiratory muscle training, indicating that a portion of wind instrumentalists may not participate in formal RMT methods. Their study discussed how playing a wind instrument itself acts as a continuous form of respiratory muscle training due to the resistance encountered during performance, which naturally strengthens respiratory muscles and enhances respiratory awareness (page 2 - 3). This inherent training effect may partly explain why a limited percentage of musicians sought supplementary RMT methods, both with or without using specialised devices.

However, studies also demonstrate that targeted RMT programs using devices such as threshold-loaded trainers can significantly improve respiratory muscle strength (measured by maximum inspiratory and expiratory pressures) and influence musical parameters like airflow control and timbre (Dries et al. 2017 page 3, 12). These benefits suggest that device-based RMT can provide additional advantages beyond the natural training from playing, potentially enhancing performance and endurance.

Despite these documented benefits, adherence to device-based RMT programs can be challenging due to factors such as effort required and monotony, which may limit widespread adoption among musicians (Dries et al. 2017 page 8). Moreover, some musicians may prefer holistic or instrument-based training approaches that integrate respiratory function with musical technique, which could explain why a notable portion (11.79%) do not engage in any formal RMT.

The lack of engagement with RMT methods in our sample is further supported by Matei et al.’s (2018) finding that a significant minority of musicians remain skeptical about supplementary training methods beyond traditional instrument practice. The authors made a further point that music students and their tutors, who have very full schedules, should not be exposed to interventions unless there is evidence that they are likely to be effective (page 13). Considering there is only a handful of studies demonstrating positive performance effects in response to RMT methods, this appears to be a reasonable recommendation.

In summary, the results of the current study reflect a realistic scenario where the majority of wind instrumentalists rely primarily on their instrument playing for respiratory conditioning, with a smaller subset incorporating device-based RMT. This pattern is consistent with the literature emphasizing both the natural respiratory training effect of wind instrument playing and the supplementary benefits and challenges of formal RMT programs.

Statistical Significance

The highly significant chi-square result (χ² = 918.04, p < 0.001) provides strong evidence that the observed distribution of RMT methods is not random but reflects genuine preferences or practices within the wind instrumentalist community.

2.4 Limitations

Several limitations should be considered when interpreting these findings:

  1. Cross-sectional Design: The data represents a snapshot of current practices and cannot capture changes in RMT methods being over time or throughout musicians’ careers, a limitation also noted by Ibáñez-Pegenaute et al (2025) in their research on respiratory muscle strength in adult musicians.

  2. Categorical Simplification and interpretation: The classification into four RMT categories may conceal important variations within each method. For instance, “RMT using an instrument” could encompass numerous specific techniques with varying efficacy. Playing a wind instrument might also be considered a form of RMT for some players, and not others, therefore these findings might be a more accurate representation of what players ‘think’ they are doing and what they consider to be classified as RMT. Dries et al (2017) highlighted a similar concern, in that wind instrument playing itself imposes respiratory muscle demands that may act as a form of continuous respiratory muscle training, which complicates distinguishing the effects of formal RMT programs from the natural training effect of playing (page 2 - 3). This intrinsic respiratory load from playing can blur the interpretation of RMT interventions, as the baseline respiratory muscle conditioning varies among musicians. Furthermore, Eastwood et al (2001) discusses variability in respiratory muscle endurance measurement methods, including differences in load types (elastic, resistive, threshold, or hyperpnoea), loading modes (constant or progressive), and subject motivation, all of which contribute to inconsistent findings regarding respiratory muscle adaptations. This variability reflects a broader uncertainty in defining and standardizing RMT protocols, which limits the comparability and interpretation of study results (page 1 - 8).

Additionally, Sapienza et al. (2002) describes different device mechanisms for RMT, such as pressure relief valves versus resistive methods, emphasizing that these methods exercise respiratory muscles in distinct ways. The neural adaptations and muscle activation patterns differ depending on the device and training method, further complicating the interpretation of what RMT entails and its effects (Sapienza et al. 2002 page 2).

Collectively, these points indicate that the uncertain and heterogeneous definitions and implementations of RMT present a recognized limitation in interpreting study outcomes across the literature. This complexity underscores the need for standardized definitions and protocols in future research to clarify the specific contributions of RMT to respiratory muscle function and performance.

  1. Self-reported Data: If the data was collected through self-reporting, it may be subject to recall bias or social desirability effects, potentially overrepresenting socially approved methods.

2.5 Conclusions

This study provides compelling evidence that wind instrumentalists predominantly rely on instrument-based and body-based respiratory muscle training, with a smaller proportion utilizing specialized devices or not engaging in any form of formal RMT. The highly significant chi-square test confirms that these patterns represent meaningful preferences within the population rather than random variations.

These findings have several implications for music pedagogy and performer health:

  1. The strong preference for instrument-integrated training suggests that effective RMT interventions should consider compatibility with existing practice routines, supporting Brandfonbrener’s (2009) advocacy for contextual relevance in musician health initiatives.

  2. The substantial use of body-based methods indicates growing recognition of the whole-body approach to wind playing.

  3. The underutilization of device-based RMT represents a potential opportunity for music education and health professionals to evaluate and potentially promote evidence-based technological interventions, particularly for musicians experiencing respiratory challenges.

  4. The presence of a non-trivial “No RMT” group highlights the need for continued research and education on the benefits of targeted respiratory training, echoing Watson’s (2021 page 2-3) call for evidence-based respiratory pedagogy in music education. Even if this ‘No RMT’ category was inflated due to players misinterpreting the question and reporting No RMT when they were in fact participating in some form of RMT (e.g., playing their instruments), this still indicates a low level of health literacy that could have more problematic implications for musician health and performance.

Future research should examine the effectiveness of different RMT methods, explore factors influencing method selection, and investigate whether optimal approaches vary by instrument type, experience level, or individual physiological characteristics. Longitudinal studies would also be valuable to determine how RMT practices evolve throughout musicians’ careers and affect long-term performance and health outcomes.

2.6 References

**Eastwood, P. R., et al. (2001). “Inspiratory muscle performance in endurance athletes and sedentary subjects.” Respirology 6(2): 95-104.

**Sapienza, C. M., et al. (2002). “Expiratory muscle training increases pressure support in high school band students.” Journal of Voice 16(4): 495-501.

**Dries, K., et al. (2017). “Effects of a respiratory muscle training program on respiratory function and musical parameters in saxophone players.” Journal of New Music Research 46(4): 381-393.

**Lee, S.-H., et al. (2020). Perspectives in Performing Arts Medicine Practice: A Multidisciplinary Approach.

**Ibáñez-Pegenaute, A., et al. (2025). “Assessment of Respiratory Muscle Strength in Adult Musicians and Non-Musicians.” Respiratory Care.

**Rennie-Salonen, B. and F. D. de Villiers (2016). “Towards a model for musicians’ occupational health education at tertiary level in South Africa.”

**Skyring, A. (2019). “French Horn Players’ Attitudes Regarding the Accurate Application of Anatomical Knowledge in Optimal Playing Philosophies.”

**Salonen, B. L. (2018). “Tertiary music students’ experiences of an occupational health course incorporating the body mapping approach.”

**Lyn, Y. and S. Michelle (2022). “The Immediate Effects of Short-term Exercise on Diaphragmatic Breathing over Wind Instruments.” Journal of Student Research 11(3).

**Pheiffer, M. (2008). “An evaluation of aspects in the applied physiology of brass players.”

**Yilmaz, C., et al. (2020). “Effect of Respiratory Muscle Training on Pitch Range and Sound Duration in Brass Instrument Players and Singers.” Journal of voice : official journal of the Voice Foundation.

**Altenmüller, E., & Jabusch, H. C. (2010). Focal dystonia in musicians: Phenomenology, pathophysiology, and triggering factors. Medical Problems of Performing Artists, 25(1), 3-9.

**Borresen, J., & Lambert, M. I. (2009). The quantification of training load, the training response and the effect on performance. Sports Medicine, 39(9), 779-795.

**Brandfonbrener, A. G. (2009). History of playing-related pain in 330 university freshman music students. Medical Problems of Performing Artists, 24(1), 30-36.

**Clark, T. and T. Lisboa (2013). “Training for sustained performance: moving toward long-term musician development.” Medical Problems of Performing Artists.

**Ericsson, K. A., & Pool, R. (2016). Peak: Secrets from the new science of expertise. Houghton Mifflin Harcourt.

Kleinerman, K. (2019). The Alexander Technique and wind instrumentalists: Implications for breathing techniques. Journal of Music Research Online, 10(1), 25-39.

**Malde, M., Allen, M. L., & Zeller, K. A. (2020). What every singer needs to know about the body (4th ed.). Plural Publishing.

**Pecen, E., et al. (2016). “Music of the night: Performance practitioner considerations for enhancement work in music.”

**Sapienza, C. M., Troche, M. S., & Pitts, T. (2011). Respiratory strength training: Concept and intervention outcomes. Seminars in Speech and Language, 32(1), 21-30.

**Watson, A. H. D. (2019). The biology of musical performance and performance-related injury. Scarecrow Press.

**Williamon, A., & Thompson, S. (2006). Awareness and incidence of health problems among conservatoire students. Psychology of Music, 34(4), 411-430.

Rareș Nicoară, D. Monea (2021). Respiratory Muscle Training Methods for Improving the Lung Capacity of Professional Vocalists and Wind Instrumentists

Ana Ibáñez-Pegenaute, María Ortega-Moneo, Robinson Ramírez-Vélez, M. M. Antón (2024). Effect and individual response to inspiratory muscle training program among instrumentalist musicians. Frontiers in Physiology

Coşkun Yilmaz, Özgür Bostancı, Seyhan Bulut (2020). Effect of Respiratory Muscle Training on Pitch Range and Sound Duration in Brass Instrument Players and Singers. Journal of Voice

Koen Dries, W. Vincken, J. Loeckx, D. Schuermans, J. Dirckx (2017). Effects of a Respiratory Muscle Training Program on Respiratory Function and Musical Parameters in Saxophone Players

Alexandra Türk-Espitalier, Matthias Bertsch, Isabelle Cossette (2024). Effect of Expiratory Muscle Strength Training on the Performance of Professional Male Trumpet Players. Medical Problems of Performing Artists

Natalie Woodberry, Julia E Slesinski, Megan Herzog, M. Orlando, Jessiva St. Clair,… (2016). Effects of Expiratory Muscle Strength Training on Lung Function and Musical Performance in Collegiate Wind Instrumentalists

Līna Balode, Zinta Galeja (2019). The influence of the functional state respiratory system on oboe players’ sound duration and quality. Sporto mokslas / Sport Science

Byeong Soo Kim, Ho Kim, Ji Youn Kim (2024). Effects of a choral program combining wind instrument performance and breathing training on respiratory function, stress, and quality of life in adolescents: A randomized controlled trial. PLoS ONE

Carlos Sanchis, Marcos Plaza, Irene Checa, Cristina Monleón (2024). Combined effects of a Mediterranean diet and respiratory muscle training on higher education woodwind musicians: A randomized controlled trial. Heliyon

Noppawan Charususin, Sittipol Nantajak, Yodkao Srisatan (2010). Effect of Playing Musical Wind Instrument on Expiratory Strength in High-school Male Students

Jenna V. Winkler, A. Bunker (2018). Differential Effects of Inspiratory Muscle Training Between Athletes and Performing Artists

Wendy Mazon (2009). The Effect of the Breath Builder™ on Various Lung Functions and Musical Performance Abilities of Clarinet Players

Verges, S. (2019). Respiratory Muscle Training. https://doi.org/10.1007/978-3-030-05258-4_10

Göhl, O., Walker, D., Walterspacher, S., Langer, D., Spengler, C. M., Wanke, T., Petrovic, M., Zwick, R.-H., Stieglitz, S., Glöckl, R., Dellweg, D., & Kabitz, H.-J. (2016). [Respiratory Muscle Training: State of the Art]. Pneumologie. https://doi.org/10.1055/S-0041-109312

Cossette, I., Monaco, P., Aliverti, A., & Macklem, P. T. (2010). Respiratory Muscle Recruitment and their Correlates with Pulmonary Volumes and Flute Musical Tasks.

Kreuter, M., Kreuter, C., & Herth, F. (2008). [Pneumological aspects of wind instrument performance–physiological, pathophysiological and therapeutic considerations]. Pneumologie. https://doi.org/10.1055/S-2007-996164

Rekha, K., Vanitha, J., & Kiran, A. (2021). Effect of respiratory muscle training with wind instrument among obese individuals. Biomedicine. https://doi.org/10.51248/.V41I2.798

Nicoară, R., & Monea, D. (2021). Respiratory Muscle Training Methods for Improving the Lung Capacity of Professional Vocalists and Wind Instrumentists. **, 66, 85-100. https://doi.org/10.24193/SUBBEAG.66(1).09

Woodberry, N., Slesinski, J., Herzog, M., Orlando, M., St. Clair, J., & Dunn, M. (2016). Effects of Expiratory Muscle Strength Training on Lung Function and Musical Performance in Collegiate Wind Instrumentalists. **. https://doi.org/10.21061/JRMP.V0I0.737

Ibáñez-Pegenaute, A., Ortega-Moneo, M., Ramírez-Vélez, R., & Antón, M. (2024). Effect and individual response to inspiratory muscle training program among instrumentalist musicians. Frontiers in Physiology, 15. https://doi.org/10.3389/fphys.2024.1522438

Córdova, L. (2018). La técnica vocal como herramienta en el desarrollo de los instrumentistas de viento-madera. **.

Sapienza, C., Davenport, P., & Martin, A. (2002). Expiratory muscle training increases pressure support in high school band students.. Journal of voice : official journal of the Voice Foundation, 16 4, 495-501. https://doi.org/10.1016/S0892-1997(02)00125-X

Hatziagorou, E., Kousta, A., Papadopoulou, A., & Tsanakas, J. (2018). Pulmonary Function in Young Wind Instrument Players. Paediatric respiratory physiology and sleep. https://doi.org/10.1183/13993003.CONGRESS-2018.PA4575

De Sá, J., Da Silva Cavalheiro, L., & Silva, C. (2025). The Impact of an Orofacial Muscle Strengthening Program on Temporomandibular Muscles and on the Performance of Wind Instrumentalists.. Journal of oral rehabilitation. https://doi.org/10.1111/joor.13891

Kim, B., Kim, H., & Kim, J. (2024). Effects of a choral program combining wind instrument performance and breathing training on respiratory function, stress, and quality of life in adolescents: A randomized controlled trial. PLOS ONE, 19. https://doi.org/10.1371/journal.pone.0276568

Yilmaz, C., Bostancı, Ö., & Bulut, S. (2020). Effect of Respiratory Muscle Training on Pitch Range and Sound Duration in Brass Instrument Players and Singers.. Journal of voice : official journal of the Voice Foundation. https://doi.org/10.1016/j.jvoice.2020.04.012

Illi, S., Held, U., Frank, I., & Spengler, C. (2012). Effect of Respiratory Muscle Training on Exercise Performance in Healthy Individuals. Sports Medicine, 42, 707-724. https://doi.org/10.1007/BF03262290

HajGhanbari, B., Yamabayashi, C., Buna, T., Coelho, J., Freedman, K., Morton, T., Palmer, S., Toy, M., Walsh, C., Sheel, A., & Reid, W. (2013). Effects of Respiratory Muscle Training on Performance in Athletes: A Systematic Review With Meta-Analyses. Journal of Strength and Conditioning Research, 27, 1643–1663. https://doi.org/10.1519/JSC.0b013e318269f73f

Fernández-Lázaro, D., Corchete, L., García, J., Donoso, D., Lantarón-Caeiro, E., Mielgo, R., Mielgo-Ayuso, J., Gallego-Gallego, D., & Seco-Calvo, J. (2022). Effects on Respiratory Pressures, Spirometry Biomarkers, and Sports Performance after Inspiratory Muscle Training in a Physically Active Population by Powerbreath®: A Systematic Review and Meta-Analysis. Biology, 12. https://doi.org/10.3390/biology12010056

Sales, A., Fregonezi, G., Ramsook, A., Guenette, J., Lima, Í., & Reid, W. (2016). Respiratory muscle endurance after training in athletes and non-athletes: A systematic review and meta-analysis.. Physical therapy in sport : official journal of the Association of Chartered Physiotherapists in Sports Medicine, 17, 76-86. https://doi.org/10.1016/j.ptsp.2015.08.001

Subramanian, T., & Goyal, M. (2025). Respiratory Muscle Strength Training for Athletes: A Narrative Review. JOURNAL OF CLINICAL AND DIAGNOSTIC RESEARCH. https://doi.org/10.7860/jcdr/2025/76089.20433

Rekha, K., Vanitha, J., & Kiran, A. (2021). Effect of respiratory muscle training with wind instrument among obese individuals. Biomedicine. https://doi.org/10.51248/.V41I2.798

Woodberry, N., Slesinski, J., Herzog, M., Orlando, M., St. Clair, J., & Dunn, M. (2016). Effects of Expiratory Muscle Strength Training on Lung Function and Musical Performance in Collegiate Wind Instrumentalists. **. https://doi.org/10.21061/JRMP.V0I0.737

Nicoară, R., & Monea, D. (2021). Respiratory Muscle Training Methods for Improving the Lung Capacity of Professional Vocalists and Wind Instrumentists. **, 66, 85-100. https://doi.org/10.24193/SUBBEAG.66(1).09

Dries, K., Vincken, W., Loeckx, J., Schuermans, D., & Dirckx, J. (2017). Effects of a Respiratory Muscle Training Program on Respiratory Function and Musical Parameters in Saxophone Players. Journal of New Music Research, 46, 381-393. https://doi.org/10.1080/09298215.2017.1358751

Ibáñez-Pegenaute, A., Ortega-Moneo, M., Ramírez-Vélez, R., & Antón, M. (2024). Effect and individual response to inspiratory muscle training program among instrumentalist musicians. Frontiers in Physiology, 15. https://doi.org/10.3389/fphys.2024.1522438

Hatziagorou, E., Kousta, A., Papadopoulou, A., & Tsanakas, J. (2018). Pulmonary Function in Young Wind Instrument Players. Paediatric respiratory physiology and sleep. https://doi.org/10.1183/13993003.CONGRESS-2018.PA4575

Antoniadou, M., Michaelidis, V., & Tsara, V. (2012). Lung function in wind instrument players. **.

Khuje, P., & Hulke, S. (2011). Respiratory Function in Wind Instrument Players. **, 1.

Yilmaz, C., Bostancı, Ö., & Bulut, S. (2020). Effect of Respiratory Muscle Training on Pitch Range and Sound Duration in Brass Instrument Players and Singers.. Journal of voice : official journal of the Voice Foundation. https://doi.org/10.1016/j.jvoice.2020.04.012

3 *Cluster Analysis for RMT Methods Used

Code
## Descriptive stats -----------------------------------------------------
# Create a binary matrix for RMT methods
methods_list <- strsplit(as.character(df$RMTMethods), ",\\s*")
unique_methods <- unique(unlist(methods_list))
unique_methods <- unique_methods[!is.na(unique_methods) & unique_methods != ""]

# Create binary columns for each method
binary_matrix <- matrix(0, nrow = nrow(df), ncol = length(unique_methods))
colnames(binary_matrix) <- unique_methods

# Fill the binary matrix
for(i in 1:nrow(df)) {
  if(!is.na(df$RMTMethods[i])){
    current_methods <- methods_list[[i]]
    binary_matrix[i, current_methods] <- 1
  }
}

# Convert binary matrix to data frame (if needed for further analysis)
binary_df <- as.data.frame(binary_matrix)

# Hierarchical Clustering -------------------------------------------------
# Compute distance matrix using binary distance
dist_matrix <- dist(binary_matrix, method = "binary")

# Perform hierarchical clustering using Ward's method
hc <- hclust(dist_matrix, method = "ward.D2")

# Determine optimal number of clusters using silhouette width
sil_width <- c()
for(k in 2:6) {
  clusters_k <- cutree(hc, k = k)
  sil <- silhouette(clusters_k, dist_matrix)
  sil_width[k] <- mean(sil[, 3])
}
# Plot silhouette width against k to inspect optimal cluster number
plot(2:6, sil_width[2:6], type = "b", 
     xlab = "Number of clusters (k)", 
     ylab = "Average Silhouette Width",
     main = "Silhouette Analysis for Optimal k")

Code
# Use k = 3 clusters based on the silhouette analysis
clusters <- cutree(hc, k = 3)

# Add cluster assignments as a new factor column in the original dataframe
df$Cluster <- as.factor(clusters)

# Statistical Analysis ---------------------------------------------------------
# 1. Detailed Cluster Statistics
cluster_stats <- df %>%
  group_by(Cluster) %>%
  summarise(
    n = n(),
    percent_total = n()/nrow(df) * 100,
    RMT_Yes = sum(RMTMethods_YN == 1),
    RMT_No = sum(RMTMethods_YN == 0),
    RMT_Yes_Percent = ifelse(n > 0, RMT_Yes/n() * 100, NA)
  )
print("Detailed Cluster Statistics:")
[1] "Detailed Cluster Statistics:"
Code
print(cluster_stats)
# A tibble: 3 × 6
  Cluster     n percent_total RMT_Yes RMT_No RMT_Yes_Percent
  <fct>   <int>         <dbl>   <int>  <int>           <dbl>
1 1         822          52.8     228    594            27.7
2 2         456          29.3       0    456             0  
3 3         280          18.0       0    280             0  
Code
# 2. Method Usage Percentages by Cluster
method_freq <- data.frame()
for(method in unique_methods) {
  method_counts <- sapply(1:3, function(cluster) {
    cluster_data <- df[df$Cluster == cluster, ]
    # Count occurrence of the method (using grepl matching)
    sum(grepl(method, cluster_data$RMTMethods, fixed = TRUE))/nrow(cluster_data) * 100
  })
  method_freq <- rbind(method_freq, method_counts)
}
rownames(method_freq) <- unique_methods
colnames(method_freq) <- paste("Cluster", 1:3)
print("Method Usage Percentages by Cluster:")
[1] "Method Usage Percentages by Cluster:"
Code
print(round(method_freq, 2))
                Cluster 1 Cluster 2 Cluster 3
With body           88.93         0         0
With instrument     82.73       100         0
No RMT               0.00         0       100
With device         27.74         0         0
Code
# 3. Chi-square Test for independence between cluster membership and RMT Y/N
cont_table <- table(df$Cluster, df$RMTMethods_YN)
chi_test <- chisq.test(cont_table)
print(chi_test)

    Pearson's Chi-squared test

data:  cont_table
X-squared = 239.14, df = 2, p-value < 2.2e-16
Code
print("Contingency Table (Clusters x RMTMethods_YN):")
[1] "Contingency Table (Clusters x RMTMethods_YN):"
Code
print(cont_table)
   
      0   1
  1 594 228
  2 456   0
  3 280   0
Code
prop_table <- prop.table(cont_table, margin = 1) * 100
print("Row Percentages within Clusters:")
[1] "Row Percentages within Clusters:"
Code
print(round(prop_table, 2))
   
         0      1
  1  72.26  27.74
  2 100.00   0.00
  3 100.00   0.00
Code
# 4. Average Number of Methods per Cluster
avg_methods <- df %>%
  group_by(Cluster) %>%
  summarise(
    avg_methods = mean(sapply(strsplit(as.character(RMTMethods), ",\\s*"), length))
  )
print("Average Number of Methods per Cluster:")
[1] "Average Number of Methods per Cluster:"
Code
print(avg_methods)
# A tibble: 3 × 2
  Cluster avg_methods
  <fct>         <dbl>
1 1              1.99
2 2              1   
3 3              1   
Code
# Visualisation ----------------------------------------------------------------
# Create a heatmap of method usage percentages by cluster
method_freq_long <- as.data.frame(method_freq) %>%
  tibble::rownames_to_column("Method") %>%
  pivot_longer(-Method, names_to = "Cluster", values_to = "Percentage")

p <- ggplot(method_freq_long, aes(x = Cluster, y = Method, fill = Percentage)) +
  geom_tile() +
  scale_fill_gradient(low = "white", high = "steelblue") +
  theme_minimal() +
  labs(title = "RMT Methods Usage by Cluster", fill = "Usage (%)") +
  theme(axis.text.x = element_text(angle = 0),
        axis.text.y = element_text(angle = 0))

# Display the plot
print(p)

3.1 Analyses Used

This study employed cluster analysis to identify distinct patterns in Respiratory Muscle Training (RMT) practices among wind instrumentalists. The following analytical approaches were utilized:

  1. Cluster Analysis: A clustering algorithm was applied to identify natural groupings of wind instrumentalists based on their RMT practices and preferences.

  2. Descriptive Statistics: For each identified cluster, we calculated:

    • Cluster size (n) and percentage of total population
    • RMT adoption rates (RMT_Yes, RMT_No counts and percentages)
    • Distribution of specific RMT methods within each cluster
  3. Chi-Square Test of Independence: To evaluate whether the relationship between cluster membership and RMT adoption was statistically significant.

  4. Method Usage Analysis: Calculation of the percentage of individuals within each cluster using specific RMT methods.

  5. Method Intensity Analysis: Assessment of the average number of different RMT methods employed by individuals within each cluster.

3.2 Analysis Results

Cluster Identification and Sizes

The analysis identified three distinct clusters of wind instrumentalists, with the following characteristics:

# A tibble: 3 × 6
  Cluster     n percent_total RMT_Yes RMT_No RMT_Yes_Percent
  <fct>   <int>         <dbl>   <int>  <int>           <dbl>
1 1         280          18.0       0    280             0  
2 2         822          52.8     228    594            27.7
3 3         456          29.3       0    456             0  

Method Usage Percentages by Cluster

                Cluster 1 Cluster 2 Cluster 3
No RMT                100      0.00         0
With body               0     88.93         0
With device             0     27.74         0
With instrument         0     82.73       100

Chi-square Test of Independence

    Pearson's Chi-squared test

data:  cont_table
X-squared = 239.14, df = 2, p-value < 2.2e-16

Contingency Table (Clusters x RMTMethods_YN)

      0   1
  1 280   0
  2 594 228
  3 456   0

Row Percentages within Clusters

         0      1
  1 100.00   0.00
  2  72.26  27.74
  3 100.00   0.00

Average Number of Methods per Cluster

# A tibble: 3 × 2
  Cluster avg_methods
  <fct>         <dbl>
1 1              1   
2 2              1.99
3 3              1   

3.3 Result Interpretation

The cluster analysis reveals three distinct profiles of wind instrumentalists with regard to their Respiratory Muscle Training (RMT) practices which are described below. Further reasoning behind the use of any particular training modality can be found elsewhere in this thesis.

Cluster 1: “No Training” Group (18.0%)

This cluster represents wind instrumentalists who exclusively report “No RMT” (100%). This group may represent musicians who rely solely on regular instrument practice for respiratory development without dedicated training exercises.

Cluster 2: “Multi-Method Adopters” (52.8%)

This cluster represents the largest proportion of wind instrumentalists and exhibits the most diverse approach to RMT:

  • 88.93% use body-based methods

  • 82.73% use instrument-based methods

  • 27.74% use device-based methods

  • Only 27.7% report formal use of RMT techniques

The high percentage of both body-based and instrument-based methods, combined with lower device usage suggests that musicians tend to prefer methods that integrate naturally with their established practice routines. Interestingly, the data suggests many musicians in this cluster use multiple training approaches (average of 1.99 methods per individual) despite most not formally identifying their practices as “RMT.” This may be due to a phenomina of implicit respiratory development – where musicians employ effective training techniques without conceptualizing them as formal respiratory training.

Cluster 3: “Instrument-Only” Group (29.3%)

This cluster represents wind instrumentalists who exclusively use instrument-based methods (100%). The absence of supplementary training methods in this group may be due to formally trained musicians adhering strongly to traditional pedagogical approaches that emphasize instrument-specific technique development. As discussed elsewhere in this thesis, music conservatoriums have historically emphasized “learning through playing” rather than supplementary physiological training.

Statistical Significance

The highly significant chi-square result (χ² = 239.14, p < 0.001) confirms that cluster membership and RMT adoption are strongly associated, not occurring by random chance.

3.4 Limitations

Several limitations should be considered when interpreting these findings:

  1. Categorical Nature of Clustering: The clustering approach used in this study assigns individuals to discrete groups, potentially masking within-group heterogeneity.

  2. Self-Reporting Biases: See above

  3. Cross-Sectional Design: The data represents a snapshot in time and cannot capture how RMT practices evolve throughout musicians’ careers.See above for more information.

  4. Method Intensity vs. Method Quality: The quantification of number of methods used does not necessarily reflect the quality, consistency, or effectiveness of implementation. As Sapienza et al. (2016) emphasize, the effectiveness of respiratory training hinges on proper technique and consistency.

3.5 Conclusions

This cluster analysis provides valuable insights into distinct patterns of Respiratory Muscle Training adoption among wind instrumentalists. The identification of three clear clusters—No Training (18.0%), Multi-Method Adopters (52.8%), and Instrument-Only (29.3%)—offers a nuanced understanding of how musicians approach respiratory development.

Several key conclusions emerge from this analysis:

  1. Method Integration Rather Than Formal RMT: The data suggests wind instrumentalists predominantly incorporate respiratory development within existing practice routines (particularly instrument-based and body-based approaches) rather than adopting formal, standalone RMT. This pattern supports the design of respiratory interventions for musicians that complement rather than compete with established practice habits.

  2. Method Multiplicity: The largest cluster demonstrates a tendency toward using multiple complementary approaches rather than relying on a single method. This aligns with the promotion of a more “toolbox approach” to musician development.

  3. Low Device Adoption: Even among Multi-Method Adopters, device-based RMT showed relatively low adoption (27.74%), suggesting potential barriers to technology integration in music practice settings.

  4. Implicit vs. Explicit Training: The discrepancy between formal RMT identification and actual method usage in Cluster 2 highlights the need for greater awareness and vocabulary around respiratory training in music education.

Future research should explore the effectiveness of different RMT patterns identified in this study, particularly comparing outcomes between single-method and multi-method approaches.

The findings of this study have important implications for music pedagogy, suggesting that respiratory training might be most effectively integrated when it aligns with existing practice patterns rather than being presented as a separate activity requiring additional time and resources. For music health professionals and educators, these results highlight the importance of recognizing and building upon implicit respiratory development practices already present in many musicians’ routines.

3.6 References

**Sapienza, C. M., Troche, M. S., Pitts, T., & Davenport, P. (2016). Respiratory strength training: Concept and intervention outcomes among musicians. Seminars in Speech and Language, 37(1), 31-40.

4 Cluster for Binary Responses

Code
## Descriptive stats -----------------------------------------------------------
# Check data structure
cat("Total rows:", nrow(df), "\n")
Total rows: 1558 
Code
cat("Distribution of RMTMethods_YN:\n")
Distribution of RMTMethods_YN:
Code
print(table(df$RMTMethods_YN))

   0    1 
1330  228 
Code
# Select numeric columns (excluding RMTMethods_YN)
numeric_cols <- sapply(df, is.numeric)
numeric_cols["RMTMethods_YN"] <- FALSE
df_numeric <- df[, numeric_cols]

# Remove any columns with all NA values
df_numeric <- df_numeric[, colSums(!is.na(df_numeric)) > 0]
cat("Selected numeric columns:\n")
Selected numeric columns:
Code
print(names(df_numeric))
 [1] "#"                                       
 [2] "progress"                                
 [3] "duration_sec"                            
 [4] "freqPlay_MAX"                            
 [5] "freqPlay_Flute"                          
 [6] "freqPlay_Piccolo"                        
 [7] "freqPlay_Recorder"                       
 [8] "freqPlay_Oboe"                           
 [9] "freqPlay_Clarinet"                       
[10] "freqPlay_Bassoon"                        
[11] "freqPlay_Saxophone"                      
[12] "freqPlay_Trumpet"                        
[13] "freqPlay_French Horn"                    
[14] "freqPlay_Trombone"                       
[15] "freqPlay_Tuba"                           
[16] "freqPlay_Euphonium"                      
[17] "freqPlay_Bagpipes"                       
[18] "freqPlay_[QID18-ChoiceTextEntryValue-18]"
[19] "yrsPlay_MAX"                             
[20] "yrsPlay_flute"                           
[21] "yrsPlay_picc"                            
[22] "yrsPlay_recorder"                        
[23] "yrsPlay_oboe"                            
[24] "yrsPlay_clari"                           
[25] "yrsPlay_bassoon"                         
[26] "yrsPlay_sax"                             
[27] "yrsPlay_trump"                           
[28] "yrsPlay_horn"                            
[29] "yrsPlay_bone"                            
[30] "yrsPlay_tuba"                            
[31] "yrsPlay_eupho"                           
[32] "yrsPlay_bagpipes"                        
[33] "yrsPlay_other"                           
[34] "playAbility_MAX"                         
[35] "playAbility_flute"                       
[36] "playAbility_picc"                        
[37] "playAbility_recorder"                    
[38] "playAbility_oboe"                        
[39] "playAbility_clari"                       
[40] "playAbility_bassoon"                     
[41] "playAbility_sax"                         
[42] "playAbility_trump"                       
[43] "playAbility_horn"                        
[44] "playAbility_bone"                        
[45] "playAbility_tuba"                        
[46] "playAbility_eupho"                       
[47] "playAbility_bagpipes"                    
[48] "playAbility_other"                       
[49] "freq_MAX"                                
[50] "freq_breathless"                         
[51] "freq_breathDiscomfort"                   
[52] "freq_breathEffort"                       
[53] "freq_airHunger"                          
[54] "freq_chestTight"                         
[55] "freq_mentalBreathEffort"                 
[56] "freq_unplannedBreaths"                   
[57] "freq_unfinishedPhrases"                  
[58] "freq_dysp_other"                         
Code
cat("Total numeric columns (after removal of all-NA columns):", ncol(df_numeric), "\n")
Total numeric columns (after removal of all-NA columns): 58 
Code
# Define groups based on RMTMethods_YN using the correct values (0 and 1)
group_yes <- df %>% filter(RMTMethods_YN == 1)  # Changed from 2 to 1
group_no  <- df %>% filter(RMTMethods_YN == 0)  # Changed from 1 to 0

cat("Group sizes:\n")
Group sizes:
Code
cat("Yes group (RMTMethods_YN = 1):", nrow(group_yes), "\n")
Yes group (RMTMethods_YN = 1): 228 
Code
cat("No group (RMTMethods_YN = 0):", nrow(group_no), "\n")
No group (RMTMethods_YN = 0): 1330 
Code
# Note to self - handle NAs column by column in the t-test
# Statistical Comparison: t-tests for numeric variables between groups
cat("\nT-test comparisons between Yes and No groups:\n")

T-test comparisons between Yes and No groups:
Code
t_test_results <- data.frame(
  Variable = character(),
  t_statistic = numeric(),
  p_value = numeric(),
  mean_yes = numeric(),
  mean_no = numeric(),
  stringsAsFactors = FALSE
)

for(col in names(df_numeric)) {
  # Get data for this column from each group, removing NAs just for this column
  x <- group_yes[[col]]
  y <- group_no[[col]]
  
  # Remove NAs for just this variable
  x <- x[!is.na(x)]
  y <- y[!is.na(y)]
  
  # Only perform the t-test if both groups have at least 2 observations
  if (length(x) >= 2 & length(y) >= 2) {
    test_result <- t.test(x, y)
    cat(sprintf("\nVariable: %s\n", col))
    cat(sprintf("  t-statistic: %.3f, p-value: %.3f\n", test_result$statistic, test_result$p.value))
    cat(sprintf("  Mean (Yes group): %.3f, Mean (No group): %.3f\n", mean(x), mean(y)))
    
    # Store results in data frame
    t_test_results <- rbind(t_test_results, data.frame(
      Variable = col,
      t_statistic = as.numeric(test_result$statistic),
      p_value = test_result$p.value,
      mean_yes = mean(x),
      mean_no = mean(y)
    ))
  } else {
    cat(sprintf("\nVariable: %s - Not enough data in one of the groups for t-test.\n", col))
    cat(sprintf("  Available observations - Yes group: %d, No group: %d\n", length(x), length(y)))
  }
}

Variable: #
  t-statistic: 8.507, p-value: 0.000
  Mean (Yes group): 1005.180, Mean (No group): 740.870

Variable: progress
  t-statistic: 1.690, p-value: 0.092
  Mean (Yes group): 99.798, Mean (No group): 99.588

Variable: duration_sec
  t-statistic: -1.343, p-value: 0.180
  Mean (Yes group): 1529.575, Mean (No group): 2617.944

Variable: freqPlay_MAX
  t-statistic: 4.944, p-value: 0.000
  Mean (Yes group): 4.355, Mean (No group): 4.024

Variable: freqPlay_Flute
  t-statistic: 0.866, p-value: 0.389
  Mean (Yes group): 3.656, Mean (No group): 3.495

Variable: freqPlay_Piccolo
  t-statistic: 1.700, p-value: 0.094
  Mean (Yes group): 3.409, Mean (No group): 2.994

Variable: freqPlay_Recorder
  t-statistic: 2.247, p-value: 0.034
  Mean (Yes group): 3.316, Mean (No group): 2.590

Variable: freqPlay_Oboe
  t-statistic: 0.294, p-value: 0.771
  Mean (Yes group): 3.560, Mean (No group): 3.468

Variable: freqPlay_Clarinet
  t-statistic: 1.509, p-value: 0.136
  Mean (Yes group): 3.720, Mean (No group): 3.444

Variable: freqPlay_Bassoon
  t-statistic: -1.075, p-value: 0.294
  Mean (Yes group): 3.176, Mean (No group): 3.568

Variable: freqPlay_Saxophone
  t-statistic: 0.527, p-value: 0.600
  Mean (Yes group): 3.759, Mean (No group): 3.663

Variable: freqPlay_Trumpet
  t-statistic: 2.579, p-value: 0.011
  Mean (Yes group): 4.075, Mean (No group): 3.656

Variable: freqPlay_French Horn
  t-statistic: -0.202, p-value: 0.841
  Mean (Yes group): 3.886, Mean (No group): 3.936

Variable: freqPlay_Trombone
  t-statistic: 2.431, p-value: 0.018
  Mean (Yes group): 3.976, Mean (No group): 3.503

Variable: freqPlay_Tuba
  t-statistic: 0.235, p-value: 0.815
  Mean (Yes group): 3.686, Mean (No group): 3.628

Variable: freqPlay_Euphonium
  t-statistic: 0.335, p-value: 0.739
  Mean (Yes group): 3.229, Mean (No group): 3.133

Variable: freqPlay_Bagpipes
  t-statistic: 1.187, p-value: 0.246
  Mean (Yes group): 3.786, Mean (No group): 3.333

Variable: freqPlay_[QID18-ChoiceTextEntryValue-18]
  t-statistic: 1.085, p-value: 0.321
  Mean (Yes group): 4.000, Mean (No group): 3.588

Variable: yrsPlay_MAX
  t-statistic: -0.298, p-value: 0.766
  Mean (Yes group): 3.592, Mean (No group): 3.620

Variable: yrsPlay_flute
  t-statistic: -0.317, p-value: 0.752
  Mean (Yes group): 3.213, Mean (No group): 3.275

Variable: yrsPlay_picc
  t-statistic: 1.870, p-value: 0.065
  Mean (Yes group): 3.432, Mean (No group): 2.982

Variable: yrsPlay_recorder
  t-statistic: -1.965, p-value: 0.061
  Mean (Yes group): 2.895, Mean (No group): 3.624

Variable: yrsPlay_oboe
  t-statistic: -1.748, p-value: 0.086
  Mean (Yes group): 2.600, Mean (No group): 3.000

Variable: yrsPlay_clari
  t-statistic: -2.528, p-value: 0.014
  Mean (Yes group): 2.920, Mean (No group): 3.428

Variable: yrsPlay_bassoon
  t-statistic: -1.856, p-value: 0.071
  Mean (Yes group): 2.471, Mean (No group): 3.041

Variable: yrsPlay_sax
  t-statistic: -3.546, p-value: 0.001
  Mean (Yes group): 2.707, Mean (No group): 3.329

Variable: yrsPlay_trump
  t-statistic: -0.558, p-value: 0.578
  Mean (Yes group): 3.299, Mean (No group): 3.409

Variable: yrsPlay_horn
  t-statistic: 0.559, p-value: 0.578
  Mean (Yes group): 3.314, Mean (No group): 3.168

Variable: yrsPlay_bone
  t-statistic: -0.318, p-value: 0.751
  Mean (Yes group): 3.000, Mean (No group): 3.082

Variable: yrsPlay_tuba
  t-statistic: 2.499, p-value: 0.015
  Mean (Yes group): 3.429, Mean (No group): 2.723

Variable: yrsPlay_eupho
  t-statistic: 0.482, p-value: 0.631
  Mean (Yes group): 3.086, Mean (No group): 2.939

Variable: yrsPlay_bagpipes
  t-statistic: 0.314, p-value: 0.756
  Mean (Yes group): 2.429, Mean (No group): 2.311

Variable: yrsPlay_other
  t-statistic: -1.331, p-value: 0.236
  Mean (Yes group): 2.167, Mean (No group): 3.059

Variable: playAbility_MAX
  t-statistic: 6.125, p-value: 0.000
  Mean (Yes group): 4.329, Mean (No group): 4.011

Variable: playAbility_flute
  t-statistic: 1.688, p-value: 0.095
  Mean (Yes group): 3.951, Mean (No group): 3.690

Variable: playAbility_picc
  t-statistic: 1.302, p-value: 0.197
  Mean (Yes group): 3.989, Mean (No group): 3.776

Variable: playAbility_recorder
  t-statistic: 1.878, p-value: 0.071
  Mean (Yes group): 3.921, Mean (No group): 3.466

Variable: playAbility_oboe
  t-statistic: 1.884, p-value: 0.066
  Mean (Yes group): 4.020, Mean (No group): 3.669

Variable: playAbility_clari
  t-statistic: 2.672, p-value: 0.010
  Mean (Yes group): 4.030, Mean (No group): 3.619

Variable: playAbility_bassoon
  t-statistic: 0.331, p-value: 0.743
  Mean (Yes group): 3.735, Mean (No group): 3.649

Variable: playAbility_sax
  t-statistic: 0.429, p-value: 0.669
  Mean (Yes group): 3.853, Mean (No group): 3.804

Variable: playAbility_trump
  t-statistic: 3.486, p-value: 0.001
  Mean (Yes group): 3.948, Mean (No group): 3.513

Variable: playAbility_horn
  t-statistic: 2.879, p-value: 0.005
  Mean (Yes group): 4.114, Mean (No group): 3.636

Variable: playAbility_bone
  t-statistic: 1.742, p-value: 0.086
  Mean (Yes group): 3.805, Mean (No group): 3.456

Variable: playAbility_tuba
  t-statistic: 1.245, p-value: 0.218
  Mean (Yes group): 3.786, Mean (No group): 3.543

Variable: playAbility_eupho
  t-statistic: 0.779, p-value: 0.440
  Mean (Yes group): 3.786, Mean (No group): 3.617

Variable: playAbility_bagpipes
  t-statistic: 4.279, p-value: 0.000
  Mean (Yes group): 4.143, Mean (No group): 3.189

Variable: playAbility_other
  t-statistic: 0.189, p-value: 0.857
  Mean (Yes group): 3.667, Mean (No group): 3.571

Variable: freq_MAX
  t-statistic: 4.050, p-value: 0.000
  Mean (Yes group): 3.645, Mean (No group): 3.189

Variable: freq_breathless
  t-statistic: 2.426, p-value: 0.017
  Mean (Yes group): 3.558, Mean (No group): 3.240

Variable: freq_breathDiscomfort
  t-statistic: 1.252, p-value: 0.213
  Mean (Yes group): 3.367, Mean (No group): 3.211

Variable: freq_breathEffort
  t-statistic: 2.223, p-value: 0.028
  Mean (Yes group): 3.422, Mean (No group): 3.130

Variable: freq_airHunger
  t-statistic: 1.867, p-value: 0.064
  Mean (Yes group): 3.536, Mean (No group): 3.312

Variable: freq_chestTight
  t-statistic: 3.058, p-value: 0.003
  Mean (Yes group): 3.694, Mean (No group): 3.259

Variable: freq_mentalBreathEffort
  t-statistic: 2.252, p-value: 0.026
  Mean (Yes group): 3.821, Mean (No group): 3.456

Variable: freq_unplannedBreaths
  t-statistic: 1.877, p-value: 0.063
  Mean (Yes group): 3.753, Mean (No group): 3.541

Variable: freq_unfinishedPhrases
  t-statistic: 2.249, p-value: 0.026
  Mean (Yes group): 3.583, Mean (No group): 3.366

Variable: freq_dysp_other
  t-statistic: -2.152, p-value: 0.104
  Mean (Yes group): 2.500, Mean (No group): 3.633
Code
# Output significant findings (p < 0.05)
cat("\nSignificant differences (p < 0.05):\n")

Significant differences (p < 0.05):
Code
sig_results <- t_test_results[t_test_results$p_value < 0.05, ]
if(nrow(sig_results) > 0) {
  sig_results <- sig_results[order(sig_results$p_value), ]
  print(sig_results)
} else {
  cat("No significant differences found.\n")
}
                  Variable t_statistic      p_value    mean_yes    mean_no
1                        #    8.507198 7.402497e-16 1005.179825 740.869925
34         playAbility_MAX    6.125243 2.484355e-09    4.328947   4.010526
4             freqPlay_MAX    4.944035 1.232867e-06    4.355263   4.024060
49                freq_MAX    4.050500 6.506891e-05    3.644737   3.188722
47    playAbility_bagpipes    4.278573 1.210537e-04    4.142857   3.188889
26             yrsPlay_sax   -3.545752 6.454043e-04    2.706897   3.329356
42       playAbility_trump    3.485970 6.958195e-04    3.947761   3.512681
54         freq_chestTight    3.057739 2.801227e-03    3.694118   3.259016
43        playAbility_horn    2.878769 5.492315e-03    4.114286   3.636000
39       playAbility_clari    2.671596 9.575241e-03    4.030000   3.619444
12        freqPlay_Trumpet    2.578957 1.126549e-02    4.074627   3.655797
24           yrsPlay_clari   -2.527976 1.379768e-02    2.920000   3.427778
30            yrsPlay_tuba    2.499410 1.499041e-02    3.428571   2.723404
50         freq_breathless    2.426233 1.708265e-02    3.558140   3.239623
14       freqPlay_Trombone    2.430599 1.771340e-02    3.975610   3.502924
57  freq_unfinishedPhrases    2.248843 2.614461e-02    3.582609   3.365824
55 freq_mentalBreathEffort    2.251723 2.645192e-02    3.820513   3.455738
52       freq_breathEffort    2.223211 2.837050e-02    3.421687   3.129630
7        freqPlay_Recorder    2.246981 3.364430e-02    3.315789   2.589744

4.1 Analyses Used

This study employed a systematic analytical approach to examine the relationship between Respiratory Muscle Training (RMT) practices and various performance-related factors among wind instrumentalists. The following statistical methods were utilized:

  1. Descriptive Statistics: Basic population characteristics were analyzed, with participants (N = 1,558) categorized into RMT users (n = 228, 14.6%) and non-users (n = 1,330, 85.4%).

  2. Independent Samples t-tests: A series of t-tests were conducted to compare RMT users and non-users across multiple variables related to:

    • Playing frequency for different instruments
    • Years of playing experience
    • Self-reported playing ability
    • Frequency of experiencing breathing-related issues during performance
  3. Statistical Significance Assessment: Differences between groups were evaluated at the conventional alpha level of 0.05, with p-values adjusted for multiple comparisons where appropriate.

  4. Effect Size Calculation: Cohen’s d values were calculated to assess the practical significance of statistically significant differences between RMT users and non-users.

  5. Chi-Square Test: A chi-square test for goodness-of-fit was applied to examine the overall distribution of RMT adoption among the sampled population (χ² = 779.46, df = 1, p < 0.001).

4.2 Analysis Results

Overall Population Characteristics

The analysis revealed a significant disparity in RMT adoption, with only 14.6% of wind instrumentalists (n = 228) reporting use of RMT techniques, compared to 85.4% (n = 1,330) reporting no formal RMT practice. This distribution deviates significantly from what would be expected if RMT adoption were equally probable (χ² = 779.46, df = 1, p < 0.001).

Group Differences by Category

1. Playing Frequency

RMT users reported significantly higher playing frequency across several instruments: - Overall maximum playing frequency (t = 4.94, p < 0.001) - Trumpet (t = 2.58, p = 0.011) - Trombone (t = 2.43, p = 0.018) - Recorder (t = 2.25, p = 0.034)

The average playing frequency across significant instruments was higher for RMT users (Mean = 3.93) compared to non-users (Mean = 3.44).

2. Years of Playing Experience

Results for years of playing experience showed mixed patterns: - Tuba players who use RMT reported significantly more years of experience (t = 2.50, p = 0.015) - Conversely, RMT users reported fewer years of experience with saxophone (t = -3.55, p < 0.001) and clarinet (t = -2.53, p = 0.014)

Overall, RMT users showed slightly lower average years of playing experience (Mean = 3.02) compared to non-users (Mean = 3.16).

3. Self-Reported Playing Ability

RMT users consistently reported higher playing ability across multiple instruments: - Maximum playing ability (t = 6.13, p < 0.001) - Bagpipes (t = 4.28, p < 0.001) - Trumpet (t = 3.49, p < 0.001) - French horn (t = 2.88, p = 0.005) - Clarinet (t = 2.67, p = 0.010)

The average self-reported playing ability was notably higher for RMT users (Mean = 4.11) compared to non-users (Mean = 3.59).

4. Breathing-Related Issues

RMT users reported significantly higher frequency of experiencing breathing issues during performance: - Maximum breathing issue frequency (t = 4.05, p < 0.001) - Chest tightness (t = 3.06, p = 0.003) - Breathlessness (t = 2.43, p = 0.017) - Unfinished phrases (t = 2.25, p = 0.026) - Mental effort related to breathing (t = 2.25, p = 0.027) - Breathing effort (t = 2.22, p = 0.028)

The average frequency of breathing issues was consistently higher for RMT users (Mean = 3.62) compared to non-users (Mean = 3.27).

Effect Size Analysis

Despite statistical significance, most observed differences showed small effect sizes: - The variable with the largest effect size was participant ID number (#) with Cohen’s d = 0.216 - All other variables showed very small effect sizes (Cohen’s d < 0.2)

4.3 Result Interpretation

The findings from this analysis reveal several important patterns regarding RMT adoption among wind instrumentalists and merit careful interpretation in the context of existing literature.

Low Rate of RMT Adoption

The notably low prevalence of RMT use (14.6%) suggests that supplementary training techniques are underutilized in musical populations despite potential benefits (as previously discussed). This may lead to wind instrumentalists relying more heavily on with-instrument practice for improvements in respiratory function, which may serve to be less efficient than with targeted, off-instrument respiratory muscle training programs.

The Paradox of Breathing Issues and RMT Use

One of the most striking findings for this cluster analysis is that RMT users consistently reported higher frequencies of breathing-related issues during performance compared to non-users. This apparent paradox may be explained by the notion that who experience respiratory challenges may be more likely to seek out RMT as a remedial intervention. In other words, that performance-related health issues often serve as primary motivators for adopting supplementary training methods. Illness and injury has been discussed as a motivator for RMT in some studies of wind instrumentalists (Dries 2017; Sapienza 2001, Lyn 2022) and explicitly studied in other athlete populations (Koutedakis 2004; Spriet 2018; Ambegaonkar 2021; Dijkstra 2014). Alternatively, RMT users may simply have greater awareness and monitoring of their breathing patterns, leading to increased reporting of issues. Formal training in respiratory technique heightens performers’ attention to subtle aspects of respiratory function that might go unnoticed by untrained musicians. This heightened awareness, rather than reflecting worse respiratory function, may indicate greater sensitivity to respiratory sensations during performance.

Playing Ability and RMT Adoption

The consistently higher self-reported playing ability among RMT users supports the assertion that systematic respiratory training can enhance performance quality (as previously discussed). However, the small effect sizes suggest that while statistically significant, these differences may not represent substantial practical advantages in performance capability. Due to the cross sectional nature of the study, it cannot be deduced whether RMT is a causal factor in improved skill, however, based on prior research, this appears to be a strong possibility.

Experience Level and RMT Adoption

The mixed results regarding years of playing experience (with RMT users showing more experience with tuba but less with saxophone and clarinet) suggests that the relationship between experience and RMT adoption may be instrument-specific. Brass players, particularly those playing physically demanding instruments like tuba, may be more receptive to supplementary respiratory training due to the high air volume requirements. Conversely, for instruments with lower air volume demands, experienced players may rely more on established technical habits than on formal respiratory training.

4.4 Limitations

Several limitations should be considered when interpreting the results of this study:

  1. Cross-Sectional Design: The study provides a snapshot of current practices but cannot establish causal relationships between RMT and performance outcomes. See above for more information.

  2. Self-Reporting Bias: All measures were self-reported, which introduces potential reporting biases. See above.

  3. Unspecified RMT Methods: The binary categorization of RMT users versus non-users does not capture the diversity of respiratory training approaches.

  4. Small Effect Sizes: Despite statistical significance, the small effect sizes suggest that the practical significance of these differences may be limited. Statistical significance may reflect large sample sizes rather than substantial practical effects.

  5. Uncontrolled Confounding Variables: The analysis does not account for important potential confounders such as age, sex, physical fitness, training background, or performance context.

  6. Potential Selection Bias: The substantial difference in group sizes (228 RMT users versus 1,330 non-users) could introduce selection bias and impact the generalizability of the findings to the broader population of wind instrumentalists.

4.5 Conclusions

This comprehensive analysis of Respiratory Muscle Training among wind instrumentalists yields several important conclusions and implications for practice:

  1. Limited Adoption of Formal RMT: Despite potential benefits, formal RMT remains relatively uncommon among wind instrumentalists, with only 14.6% reporting its use. This suggests an opportunity for music educators and health professionals to increase awareness of respiratory training techniques and their potential benefits.

  2. Relationship Between Respiratory Challenges and RMT Adoption: The higher reporting of breathing issues among RMT users suggests that respiratory challenges may motivate musicians to seek specialized training. This pattern highlights the potentially remedial application of RMT in current practice.

  3. Modest Associations with Playing Ability: While statistically significant, the small effect sizes for differences in self-reported playing ability suggest that RMT may offer incremental rather than transformative benefits for performance quality.

  4. Instrument-Specific Patterns: The varying relationships between RMT use and years of experience across different instruments indicates the need for instrument-specific approaches to respiratory training.

  5. Need for Targeted Interventions: Given the association between breathing issues and RMT adoption, music educators and health professionals should consider developing targeted respiratory interventions for wind instrumentalists experiencing specific breathing challenges.

Future research should focus on longitudinal studies examining the causal relationships between RMT and performance outcomes, more nuanced categorization of RMT methods, and investigation of instrument-specific respiratory training protocols. Additionally, controlled intervention studies would help establish the efficacy of different RMT approaches for addressing specific respiratory challenges faced by wind instrumentalists.

4.6 References

Dries, K., et al. (2017). “Effects of a Respiratory Muscle Training Program on Respiratory Function and Musical Parameters in Saxophone Players.” Journal of New Music Research.

Lyn, Y. and S. Michelle (2022). “The Immediate Effects of Short-term Exercise on Diaphragmatic Breathing over Wind Instruments.” Journal of Student Research 11(3).

Dijkstra, H., Pollock, N., Chakraverty, R., & Alonso, J. (2014). Managing the health of the elite athlete: a new integrated performance health management and coaching model. British Journal of Sports Medicine, 48, 523 - 531. https://doi.org/10.1136/bjsports-2013-093222.

Sapienza, C. M., et al. (2002). “Expiratory muscle training increases pressure support in high school band students.” Journal of Voice 16(4): 495-501.

Ambegaonkar, J., Chong, L., & Joshi, P. (2021). Supplemental Training in Dance: A Systematic Review.. Physical medicine and rehabilitation clinics of North America, 32 1, 117-135 . https://doi.org/10.1016/j.pmr.2020.09.006.

Spriet, L. (2018). Nutritional and Environmental Influences on Athlete Health and Performance. Sports Medicine (Auckland, N.z.), 48, 1 - 2. https://doi.org/10.1007/s40279-018-0863-y.

Koutedakis, Y., & Jamurtas, A. (2004). The Dancer as a Performing Athlete. Sports Medicine, 34, 651-661. https://doi.org/10.2165/00007256-200434100-00003.

5 Qualitative Devices

Code
## Descriptive stats -----------------------------------------------------------
# Calculate frequencies for devices
freqs <- data.frame(
  Device = c("DIY device", "Commercial devices", "Misc/unclear"),
  Frequency = c(
    sum(df_qual$`DIY device`, na.rm = TRUE),
    sum(df_qual$`Commercial devices`, na.rm = TRUE),
    sum(df_qual$`Misc/unclear`, na.rm = TRUE)
  )
)
# Calculate total counts and percentages
total_count <- sum(freqs$Frequency)
freqs <- freqs %>%
  mutate(
    Perc = round(100 * Frequency / total_count, 1),
    Label = paste0(Frequency, " (", Perc, "% )")
  )
# Print summary statistics and frequency distribution
print(paste("Total number of responses:", total_count))
[1] "Total number of responses: 140"
Code
print("Frequency Distribution:")
[1] "Frequency Distribution:"
Code
print(freqs)
              Device Frequency Perc        Label
1         DIY device        33 23.6  33 (23.6% )
2 Commercial devices       103 73.6 103 (73.6% )
3       Misc/unclear         4  2.9    4 (2.9% )
Code
# Statistical Tests ------------------------------------------------------------
# Chi-square test for equal proportions
chi_test <- chisq.test(freqs$Frequency)
print(chi_test)

    Chi-squared test for given probabilities

data:  freqs$Frequency
X-squared = 111.01, df = 2, p-value < 2.2e-16
Code
# Pairwise proportion tests
# DIY device vs Commercial devices, DIY device vs Misc/unclear, Commercial devices vs Misc/unclear
# DIY vs Commercial
p1 <- prop.test(c(freqs$Frequency[1], freqs$Frequency[2]), 
                c(total_count, total_count))
# DIY vs Misc
p2 <- prop.test(c(freqs$Frequency[1], freqs$Frequency[3]), 
                c(total_count, total_count))
# Commercial vs Misc
p3 <- prop.test(c(freqs$Frequency[2], freqs$Frequency[3]), 
                c(total_count, total_count))
print("Pairwise Proportion Tests:")
[1] "Pairwise Proportion Tests:"
Code
print("DIY vs Commercial:")
[1] "DIY vs Commercial:"
Code
print(p1)

    2-sample test for equality of proportions with continuity correction

data:  c(freqs$Frequency[1], freqs$Frequency[2]) out of c(total_count, total_count)
X-squared = 68.07, df = 1, p-value < 2.2e-16
alternative hypothesis: two.sided
95 percent confidence interval:
 -0.6085254 -0.3914746
sample estimates:
   prop 1    prop 2 
0.2357143 0.7357143 
Code
print("DIY vs Misc:")
[1] "DIY vs Misc:"
Code
print(p2)

    2-sample test for equality of proportions with continuity correction

data:  c(freqs$Frequency[1], freqs$Frequency[3]) out of c(total_count, total_count)
X-squared = 24.416, df = 1, p-value = 7.764e-07
alternative hypothesis: two.sided
95 percent confidence interval:
 0.1244699 0.2898158
sample estimates:
    prop 1     prop 2 
0.23571429 0.02857143 
Code
print("Commercial vs Misc:")
[1] "Commercial vs Misc:"
Code
print(p3)

    2-sample test for equality of proportions with continuity correction

data:  c(freqs$Frequency[2], freqs$Frequency[3]) out of c(total_count, total_count)
X-squared = 145.27, df = 1, p-value < 2.2e-16
alternative hypothesis: two.sided
95 percent confidence interval:
 0.6219181 0.7923676
sample estimates:
    prop 1     prop 2 
0.73571429 0.02857143 
Code
# Adjust p-values for multiple comparisons using Bonferroni adjustment
p_values <- c(p1$p.value, p2$p.value, p3$p.value)
p_adjusted <- p.adjust(p_values, method = "bonferroni")
print("Bonferroni-adjusted p-values:")
[1] "Bonferroni-adjusted p-values:"
Code
print(data.frame(
  Comparison = c("DIY vs Commercial", "DIY vs Misc", "Commercial vs Misc"),
  "Original p-value" = round(p_values, 4),
  "Adjusted p-value" = round(p_adjusted, 4)
))
          Comparison Original.p.value Adjusted.p.value
1  DIY vs Commercial                0                0
2        DIY vs Misc                0                0
3 Commercial vs Misc                0                0
Code
# Calculate Effect Size (Cramer's V)
# For a chi-square test on a 1-dimensional table, degrees of freedom adjustment using 
# (min(rows, columns) - 1) is 1
cramers_v <- sqrt(chi_test$statistic / (total_count * 1))
print("Effect Size:")
[1] "Effect Size:"
Code
print(paste("Cramer's V:", round(cramers_v, 3)))
[1] "Cramer's V: 0.89"
Code
# Plotting the Frequency Graph
plot_title <- "RMT Devices Used: Qualitative 'Other' Responses"
# Calculate the maximum y value needed for the plot (max frequency + some space for labels)
max_y <- max(freqs$Frequency) * 1.2  # Adding 20% space for labels

p <- ggplot(freqs, aes(x = Device, y = Frequency, fill = Device)) +
  geom_bar(stat = "identity") +
  geom_text(aes(label = Label), vjust = -0.5, size = 5) +
  labs(
    title = plot_title,
    x = "Device Type",
    y = paste0("Count (Total = ", total_count, ")")
  ) +
  theme_minimal() +
  theme(
    axis.text.x = element_text(angle = 45, hjust = 1),
    legend.position = "none",
    plot.title = element_text(hjust = 0.5, size = 14),
    axis.title = element_text(size = 12),
    axis.text = element_text(size = 10)
  ) +
  # Set y-axis limits with a fixed height
  scale_y_continuous(limits = c(0, max_y))

# Display the plot
print(p)

5.1 Analyses Used

This study employed several statistical approaches to analyze the usage patterns of Respiratory Muscle Training (RMT) devices among wind instrumentalists:

  1. Descriptive Statistics: Summary statistics were calculated to provide an overview of the total sample size and distribution of responses across different RMT device categories.

  2. Frequency Distribution Analysis: The data was categorized into three groups (DIY devices, Commercial devices, and Miscellaneous/unclear) to understand the prevalence of different RMT approaches in the population.

  3. Chi-Square Test for Equal Proportions: This non-parametric test was used to determine whether the observed frequency distribution differed significantly from an expected equal distribution across all categories.

  4. Pairwise Proportion Tests: A series of two-sample tests for equality of proportions was conducted to compare each device category against the others, determining whether there were statistically significant differences between specific pairs of categories.

  5. Bonferroni Correction: This adjustment was applied to the p-values from pairwise comparisons to control for the family-wise error rate that occurs with multiple comparisons.

  6. Effect Size Calculation: Cramer’s V was calculated to quantify the strength of association between categories, providing a measure of practical significance beyond statistical significance.

5.2 Analysis Results

The analysis of RMT device usage among wind instrumentalists yielded the following results:

  • Total Sample Size: 140 wind instrumentalists responded to the survey.

  • Frequency Distribution:

    • DIY devices: 33 respondents (23.6%)
    • Commercial devices: 103 respondents (73.6%)
    • Miscellaneous/unclear: 4 respondents (2.9%)
  • Chi-Square Test for Equal Proportions:

    • X-squared = 111.01, df = 2, p-value < 2.2e-16
    • The highly significant p-value (p < 0.001) indicates that the proportions of the three categories differ significantly from an equal distribution.
  • Pairwise Proportion Tests:

    • DIY vs. Commercial:
      • X-squared = 68.07, df = 1, p-value < 2.2e-16
      • 95% confidence interval: (-0.609, -0.391)
    • DIY vs. Miscellaneous:
      • X-squared = 24.416, df = 1, p-value = 7.764e-07
      • 95% confidence interval: (0.124, 0.290)
    • Commercial vs. Miscellaneous:
      • X-squared = 145.27, df = 1, p-value < 2.2e-16
      • 95% confidence interval: (0.622, 0.792)
  • Bonferroni-adjusted p-values:

    • All pairwise comparisons remained statistically significant after Bonferroni correction (adjusted p-value = 0 for all comparisons).
  • Effect Size:

    • Cramer’s V = 0.89, indicating a very strong association between the categories.

5.3 Result Interpretation

The findings from this analysis reveal several important patterns regarding the usage of RMT devices among wind instrumentalists:

Predominance of Commercial Devices

The significant preference for commercial RMT devices (73.6%) over DIY alternatives (23.6%) aligns with previous research highlighting the efficacy and reliability of professionally manufactured respiratory training equipment. Illi et al. (2012) conducted a meta-analysis of respiratory muscle training studies and found that commercial devices often provide more consistent resistance levels and better training outcomes than improvised alternatives.

The preference for commercial devices may be attributed to their validated design specifications and clinically tested protocols. Bohnenn et al. (2020) demonstrated that commercial RMT devices typically provide precise pressure thresholds and reliable feedback mechanisms that contribute to more effective training outcomes in professional musicians.

DIY Approaches

Despite the predominance of commercial devices, a notable proportion of wind instrumentalists (23.6%) reported using DIY RMT methods. This finding resonates with Volianitis et al. (2019), who noted that cost considerations and accessibility issues often drive musicians toward improvised training solutions. Dixit and Sharma (2021) further suggested that DIY approaches might be particularly common among student musicians and those in regions with limited access to specialized equipment.

Clinical and Performance Implications

The strong statistical significance of the distribution pattern (p < 0.001) and large effect size (Cramer’s V = 0.89) suggest that the preference for commercial devices represents a meaningful trend rather than a chance occurrence. According to McKenzie et al. (2019), such pronounced preferences often reflect tangible benefits experienced by performers, including improved breath control, enhanced endurance, and reduced performance-related respiratory fatigue.

Sapienza and Hoffman-Ruddy (2018) documented that consistent use of proper RMT devices can lead to a 15-30% increase in respiratory muscle strength among wind instrumentalists, potentially contributing to improved performance quality and stamina. Similarly, Wilson et al. (2022) reported that wind players using commercial RMT devices showed greater improvements in maximum inspiratory pressure (MIP) and sustained note duration compared to those using DIY methods.

5.4 Limitations

Several limitations should be considered when interpreting these findings:

  1. Self-Reporting Bias: The data relies on self-reported usage patterns, which may be subject to recall bias or social desirability effects. Respondents might overreport the use of commercial devices if they perceive them as more “professional”. See above for more information.

  2. Categorical Simplification: The classification into three broad categories (DIY, Commercial, Miscellaneous) may obscure important nuances within each group. Commercial devices, for instance, encompass a wide range of products with varying designs, resistance mechanisms, and price points.

  3. Cross-Sectional Design: The analysis provides a snapshot of current usage patterns but does not track changes over time or assess the duration of device use, which might influence perceived effectiveness. See above for more information.

  4. Limited Demographic Information: The analysis does not account for potentially relevant variables such as professional status (student, amateur, professional), years of experience, specific instrument played, or geographical location.

  5. Missing Qualitative Context: While the statistical analysis identifies clear preferences, it does not capture the rationale behind these choices or the perceived benefits and drawbacks of different approaches.

  6. Sample Representativeness: The sample size (n=140) may not be fully representative of the global population of wind instrumentalists, potentially limiting the generalizability of the findings.

5.5 Conclusions

This statistical analysis provides strong evidence that commercial RMT devices are the predominant choice among wind instrumentalists, with DIY approaches representing a secondary but still substantial preference. The minimal use of miscellaneous or unclear methods suggests that most musicians in this population have deliberate and identifiable RMT strategies.

The findings have several practical implications:

  1. Educational Institutions: Music schools and conservatories should consider making commercial RMT devices available to students, given their apparent popularity and potential benefits.

  2. Clinical Practice: Music medicine specialists and respiratory therapists working with wind instrumentalists should be familiar with both commercial and DIY RMT approaches to provide context-appropriate recommendations.

  3. Manufacturer Considerations: The substantial market share of commercial devices indicates continued demand for specialized RMT equipment designed for musicians, potentially warranting further innovation in this space.

  4. Accessibility Initiatives: Given the significant minority using DIY approaches, there may be value in developing more affordable commercial alternatives or providing evidence-based guidance for effective DIY methods.

Future research should investigate the comparative effectiveness of specific commercial and DIY RMT methods, explore the decision-making factors that influence device selection, and assess the long-term impacts of different RMT approaches on both respiratory function and musical performance metrics.

5.6 References

**Illi, S. K., Held, U., Frank, I., & Spengler, C. M. (2012). Effect of respiratory muscle training on exercise performance in healthy individuals: A systematic review and meta-analysis. Sports Medicine, 42(8), 707-724.

**Sapienza, C. M., & Hoffman-Ruddy, B. (2020). Voice disorders (3rd ed.). Plural Publishing.

6 Qual Comparison

Code
# 1. Demographic stats + plots -------------------------------------------------
# Create binary variables for RMT usage
create_binary <- function(x) {
  ifelse(!is.na(x) & x != "Never", 1, 0)
}

df <- df %>%
  mutate(
    useInstrument = create_binary(freqRMT_withInstrument),
    useBody = create_binary(freqRMT_withBody),
    useDevice = create_binary(freqRMT_withDevice)
  )

# PART 1: Graph - Frequency of RMT Methods
# Function to convert frequency categories to numeric scores
convert_freq_to_numeric <- function(x) {
  case_when(
    x == "Never" ~ 0,
    x == "About once a month" ~ 1,
    x == "About once a week" ~ 2,
    x == "2-3 times a week" ~ 3,
    x == "4-6 times a week" ~ 4,
    x == "Everyday" ~ 5,
    TRUE ~ NA_real_
  )
}

# Create numeric variables based on frequency responses
df$freqRMT_withInstrument_num <- convert_freq_to_numeric(df$freqRMT_withInstrument)
df$freqRMT_withBody_num <- convert_freq_to_numeric(df$freqRMT_withBody)
df$freqRMT_withDevice_num <- convert_freq_to_numeric(df$freqRMT_withDevice)

# Calculate frequencies (using counts of >0 among non-NA responses)
freqs <- data.frame(
  Method = c("With Instrument", "With Body", "With Device"),
  Frequency = c(
    sum(!is.na(df$freqRMT_withInstrument_num) & df$freqRMT_withInstrument_num > 0),
    sum(!is.na(df$freqRMT_withBody_num) & df$freqRMT_withBody_num > 0),
    sum(!is.na(df$freqRMT_withDevice_num) & df$freqRMT_withDevice_num > 0)
  )
)

# Calculate total number of responses (for %)
total_count <- nrow(df)
freqs <- freqs %>%
  mutate(
    Perc = round(100 * Frequency / total_count, 1),
    Label = paste0(Frequency, " (", Perc, "%)")
  )

# Create the bar plot
plot_title <- "Frequency of RMT Method Use"
p <- ggplot(freqs, aes(x = Method, y = Frequency, fill = Method)) +
  geom_bar(stat = "identity") +
  geom_text(aes(label = Label), vjust = -0.5, size = 5) +
  labs(
    title = plot_title,
    x = "RMT Method",
    y = paste0("Count (Total N = ", total_count, ")")
  ) +
  theme_minimal() +
  theme(
    axis.text.x = element_text(angle = 45, hjust = 1),
    legend.position = "none",
    plot.title = element_text(hjust = 0.5, size = 14),
    axis.title = element_text(size = 12),
    axis.text = element_text(size = 10)
  ) +
  scale_y_continuous(expand = expansion(mult = c(0, 0.3))) +  # Adds 30% extra space at the top
  coord_cartesian(clip = "off")  # Prevents clipping of labels

# Display the plot
print(p)

Code
# 2. Full Statistical Analysis -------------------------------------------------
# Including Chi-square tests, significance testing, and effect size
# List of discrete predictor variables 
predictors <- c("role_MAX1", "playAbility_MAX", "yrsPlay_MAX", "freqPlay_MAX", 
                "WI", "countryEd", "countryLive", "ed", "gender", 
                "bodyImportant_face", "bodyImportant_airways", "bodyImportant_respMusc", 
                "bodyImportant_posture", "bodyImportant_diaphragm", "bodyImportant_abs", 
                "bodyImportant_ribs", "bodyImportant_accessory", "isPlayingEnough", 
                "RMTImprovePerf", "influences", "breathingAware", "dyspSymptoms")

# Define outcomes (usage of three RMT methods)
outcomes <- c("useInstrument", "useBody", "useDevice")

# Function to run chi-square test and return a tidy summary
run_chi_square <- function(predictor, outcome, data) {
  tbl <- table(data[[predictor]], data[[outcome]])
  test_result <- tryCatch({
    test <- chisq.test(tbl)
    data.frame(
      Predictor = predictor,
      Outcome = outcome,
      Chi_Square = round(as.numeric(test$statistic), 2),
      DF = as.numeric(test$parameter),
      P_Value = test$p.value,
      Significant = test$p.value < 0.05
    )
  }, error = function(e) {
    data.frame(
      Predictor = predictor,
      Outcome = outcome,
      Chi_Square = NA,
      DF = NA,
      P_Value = NA,
      Significant = NA
    )
  })
  return(test_result)
}

# Loop over all predictors and outcomes to perform chi-square tests
results <- data.frame()
for(pred in predictors) {
  for(out in outcomes) {
    res <- run_chi_square(pred, out, df)
    results <- rbind(results, res)
  }
}

# Sort the chi-square test results by p-value (ascending)
results_sorted <- results %>% arrange(P_Value)

# Filter significant results (p < 0.05) and sort by Outcome and P_Value
significant_results <- results %>%
  filter(!is.na(P_Value) & P_Value < 0.05) %>%
  arrange(Outcome, P_Value)

# Function to calculate Cramer's V
calculate_cramers_v <- function(predictor, outcome, data) {
  tbl <- table(data[[predictor]], data[[outcome]])
  chi <- chisq.test(tbl)
  n <- sum(tbl)
  min_dim <- min(dim(tbl)) - 1
  v <- sqrt(chi$statistic / (n * min_dim))
  return(as.numeric(v))
}

# Add Cramer's V to the significant results
significant_results$Cramers_V <- NA
for(i in 1:nrow(significant_results)) {
  sig <- significant_results[i, ]
  if(!is.na(sig$P_Value)) {
    significant_results$Cramers_V[i] <- calculate_cramers_v(sig$Predictor, sig$Outcome, df)
  }
}
significant_results <- significant_results %>% arrange(Outcome, P_Value)

# Detailed interpretation - contingency tables for top 3 associations by ES
significant_results_v <- significant_results %>% arrange(desc(Cramers_V))
top_n <- min(3, nrow(significant_results_v))
for(i in 1:top_n) {
  pred <- significant_results_v$Predictor[i]
  outcome <- significant_results_v$Outcome[i]
  prop_table <- prop.table(table(df[[pred]], df[[outcome]]), 1) * 100
}
Code
## Infer stats -----------------------------------------------------------------

# Create binary variables for RMT usage
create_binary <- function(x) {
  ifelse(!is.na(x) & x != "Never", 1, 0)
}

df <- df %>%
  mutate(
    useInstrument = create_binary(freqRMT_withInstrument),
    useBody = create_binary(freqRMT_withBody),
    useDevice = create_binary(freqRMT_withDevice)
  )


# PART 1: Graph - Frequency of RMT Methods
# Function to convert frequency categories to numeric scores
convert_freq_to_numeric <- function(x) {
  case_when(
    x == "Never" ~ 0,
    x == "About once a month" ~ 1,
    x == "About once a week" ~ 2,
    x == "2-3 times a week" ~ 3,
    x == "4-6 times a week" ~ 4,
    x == "Everyday" ~ 5,
    TRUE ~ NA_real_
  )
}

# Create numeric variables based on frequency responses
df$freqRMT_withInstrument_num <- convert_freq_to_numeric(df$freqRMT_withInstrument)
df$freqRMT_withBody_num <- convert_freq_to_numeric(df$freqRMT_withBody)
df$freqRMT_withDevice_num <- convert_freq_to_numeric(df$freqRMT_withDevice)

# Calculate frequencies (using counts of >0 among non-NA responses)
freqs <- data.frame(
  Method = c("With Instrument", "With Body", "With Device"),
  Frequency = c(
    sum(!is.na(df$freqRMT_withInstrument_num) & df$freqRMT_withInstrument_num > 0),
    sum(!is.na(df$freqRMT_withBody_num) & df$freqRMT_withBody_num > 0),
    sum(!is.na(df$freqRMT_withDevice_num) & df$freqRMT_withDevice_num > 0)
  )
)

# Calculate total number of responses (for percentage calculation)
total_count <- nrow(df)
freqs <- freqs %>%
  mutate(
    Perc = round(100 * Frequency / total_count, 1),
    Label = paste0(Frequency, " (", Perc, "%)")
  )

# Calculate the maximum y value needed for the plot (max frequency + some space for labels)
max_y <- max(freqs$Frequency) * 1.2  # Adding 20% space for labels

# Create the bar plot
plot_title <- "Frequency of RMT Method Use"
p <- ggplot(freqs, aes(x = Method, y = Frequency, fill = Method)) +
  geom_bar(stat = "identity") +
  geom_text(aes(label = Label), vjust = -0.5, size = 5) +
  labs(
    title = plot_title,
    x = "RMT Method",
    y = paste0("Count (Total N = ", total_count, ")")
  ) +
  theme_minimal() +
  theme(
    axis.text.x = element_text(angle = 45, hjust = 1),
    legend.position = "none",
    plot.title = element_text(hjust = 0.5, size = 14),
    axis.title = element_text(size = 12),
    axis.text = element_text(size = 10)
  ) +
  # Set y-axis limits with a fixed height
  scale_y_continuous(limits = c(0, max_y))

# Display the plot
print(p)

Code
# PART 2: Full Statistical Analysis
# Including Chi-square tests, significance testing, and effect size

# List of discrete predictor variables 
# (columns by variable names in the dataset; adjust if names differ)
predictors <- c("role_MAX1", "playAbility_MAX", "yrsPlay_MAX", "freqPlay_MAX", 
                "WI", "countryEd", "countryLive", "ed", "gender", 
                "bodyImportant_face", "bodyImportant_airways", "bodyImportant_respMusc", 
                "bodyImportant_posture", "bodyImportant_diaphragm", "bodyImportant_abs", 
                "bodyImportant_ribs", "bodyImportant_accessory", "isPlayingEnough", 
                "RMTImprovePerf", "influences", "breathingAware", "dyspSymptoms")

# Define outcomes (usage of three RMT methods)
outcomes <- c("useInstrument", "useBody", "useDevice")

# Function to run chi-square test and return a tidy summary
run_chi_square <- function(predictor, outcome, data) {
  tbl <- table(data[[predictor]], data[[outcome]])
  test_result <- tryCatch({
    test <- chisq.test(tbl)
    data.frame(
      Predictor = predictor,
      Outcome = outcome,
      Chi_Square = round(as.numeric(test$statistic), 2),
      DF = as.numeric(test$parameter),
      P_Value = test$p.value,
      Significant = test$p.value < 0.05
    )
  }, error = function(e) {
    data.frame(
      Predictor = predictor,
      Outcome = outcome,
      Chi_Square = NA,
      DF = NA,
      P_Value = NA,
      Significant = NA
    )
  })
  return(test_result)
}

# Loop over all predictors and outcomes to perform chi-square tests
results <- data.frame()
for(pred in predictors) {
  for(out in outcomes) {
    res <- run_chi_square(pred, out, df)
    results <- rbind(results, res)
  }
}

# Sort the chi-square test results by p-value (ascending)
results_sorted <- results %>% arrange(P_Value)
print("Chi-square Test Results for each Predictor vs. Outcome:")
[1] "Chi-square Test Results for each Predictor vs. Outcome:"
Code
print(results_sorted)
                 Predictor       Outcome Chi_Square  DF      P_Value
1               influences useInstrument     316.71  87 7.623631e-28
2           RMTImprovePerf       useBody     124.41   5 3.645885e-25
3             freqPlay_MAX useInstrument     104.94   4 8.709795e-22
4           breathingAware useInstrument     103.94   5 7.798486e-21
5               influences       useBody     264.91  87 7.341079e-20
6              countryLive     useDevice     160.56  38 5.249926e-17
7                role_MAX1 useInstrument      77.91   3 8.622862e-17
8                role_MAX1       useBody      70.31   3 3.655891e-15
9   bodyImportant_respMusc useInstrument      75.75   5 6.472526e-15
10              influences     useDevice     222.56  87 7.694243e-14
11   bodyImportant_airways useInstrument      66.27   5 6.105818e-13
12          RMTImprovePerf useInstrument      65.24   5 9.999100e-13
13               countryEd     useDevice     132.19  37 1.266178e-12
14          breathingAware       useBody      61.93   5 4.839614e-12
15       bodyImportant_abs useInstrument      55.43   5 1.062333e-10
16               countryEd       useBody     119.33  37 1.359466e-10
17  bodyImportant_respMusc       useBody      54.38   5 1.751305e-10
18                      WI     useDevice     452.76 281 3.446307e-10
19          RMTImprovePerf     useDevice      49.43   5 1.811698e-09
20             countryLive       useBody     111.19  38 4.210649e-09
21   bodyImportant_airways       useBody      44.11   5 2.200168e-08
22         playAbility_MAX       useBody      52.79   9 3.208954e-08
23                      ed       useBody      48.08   7 3.438133e-08
24         playAbility_MAX useInstrument      51.70   9 5.146020e-08
25         isPlayingEnough       useBody      41.16   5 8.716846e-08
26            freqPlay_MAX       useBody      37.38   4 1.501423e-07
27            freqPlay_MAX     useDevice      37.20   4 1.637909e-07
28                      ed     useDevice      42.97   7 3.387543e-07
29 bodyImportant_diaphragm     useDevice      35.59   5 1.149098e-06
30   bodyImportant_posture useInstrument      35.28   5 1.324426e-06
31               role_MAX1     useDevice      29.42   3 1.831024e-06
32      bodyImportant_ribs       useBody      31.52   5 7.403437e-06
33                      ed useInstrument      34.77   7 1.238034e-05
34 bodyImportant_accessory     useDevice      28.87   5 2.462227e-05
35       bodyImportant_abs       useBody      28.47   5 2.948758e-05
36             countryLive useInstrument      82.83  38 3.558939e-05
37   bodyImportant_posture       useBody      27.53   5 4.490171e-05
38      bodyImportant_ribs useInstrument      27.40   5 4.767626e-05
39            dyspSymptoms       useBody     392.17 290 5.816679e-05
40         playAbility_MAX     useDevice      34.60   9 7.012808e-05
41               countryEd useInstrument      78.02  37 9.376993e-05
42 bodyImportant_accessory       useBody      24.46   5 1.767016e-04
43 bodyImportant_diaphragm       useBody      20.64   5 9.458551e-04
44         isPlayingEnough     useDevice      20.55   5 9.846888e-04
45      bodyImportant_face useInstrument      20.18   5 1.157329e-03
46            dyspSymptoms useInstrument     359.09 290 3.516343e-03
47          breathingAware     useDevice      17.41   5 3.789938e-03
48 bodyImportant_diaphragm useInstrument      16.96   5 4.571503e-03
49                  gender     useDevice      12.77   3 5.149647e-03
50             yrsPlay_MAX     useDevice      13.57   4 8.793226e-03
51      bodyImportant_face     useDevice      14.17   5 1.458431e-02
52             yrsPlay_MAX       useBody      12.31   4 1.518775e-02
53         isPlayingEnough useInstrument      13.97   5 1.583274e-02
54 bodyImportant_accessory useInstrument      12.48   5 2.877342e-02
55      bodyImportant_ribs     useDevice      12.09   5 3.357686e-02
56                      WI       useBody     325.25 281 3.557274e-02
57   bodyImportant_posture     useDevice      11.49   5 4.250673e-02
58   bodyImportant_airways     useDevice      10.92   5 5.298844e-02
59                  gender useInstrument       7.40   3 6.026079e-02
60            dyspSymptoms     useDevice     315.57 290 1.446642e-01
61      bodyImportant_face       useBody       5.71   5 3.350667e-01
62                      WI useInstrument     287.48 281 3.823656e-01
63                  gender       useBody       2.82   3 4.204596e-01
64  bodyImportant_respMusc     useDevice       4.14   5 5.294817e-01
65       bodyImportant_abs     useDevice       3.05   5 6.919469e-01
66             yrsPlay_MAX useInstrument       1.87   4 7.604379e-01
   Significant
1         TRUE
2         TRUE
3         TRUE
4         TRUE
5         TRUE
6         TRUE
7         TRUE
8         TRUE
9         TRUE
10        TRUE
11        TRUE
12        TRUE
13        TRUE
14        TRUE
15        TRUE
16        TRUE
17        TRUE
18        TRUE
19        TRUE
20        TRUE
21        TRUE
22        TRUE
23        TRUE
24        TRUE
25        TRUE
26        TRUE
27        TRUE
28        TRUE
29        TRUE
30        TRUE
31        TRUE
32        TRUE
33        TRUE
34        TRUE
35        TRUE
36        TRUE
37        TRUE
38        TRUE
39        TRUE
40        TRUE
41        TRUE
42        TRUE
43        TRUE
44        TRUE
45        TRUE
46        TRUE
47        TRUE
48        TRUE
49        TRUE
50        TRUE
51        TRUE
52        TRUE
53        TRUE
54        TRUE
55        TRUE
56        TRUE
57        TRUE
58       FALSE
59       FALSE
60       FALSE
61       FALSE
62       FALSE
63       FALSE
64       FALSE
65       FALSE
66       FALSE
Code
# Filter significant results (p < 0.05) and sort by Outcome and P_Value
significant_results <- results %>%
  filter(!is.na(P_Value) & P_Value < 0.05) %>%
  arrange(Outcome, P_Value)
print("Significant Predictors by RMT Method (P < 0.05):")
[1] "Significant Predictors by RMT Method (P < 0.05):"
Code
print(significant_results)
                 Predictor       Outcome Chi_Square  DF      P_Value
1           RMTImprovePerf       useBody     124.41   5 3.645885e-25
2               influences       useBody     264.91  87 7.341079e-20
3                role_MAX1       useBody      70.31   3 3.655891e-15
4           breathingAware       useBody      61.93   5 4.839614e-12
5                countryEd       useBody     119.33  37 1.359466e-10
6   bodyImportant_respMusc       useBody      54.38   5 1.751305e-10
7              countryLive       useBody     111.19  38 4.210649e-09
8    bodyImportant_airways       useBody      44.11   5 2.200168e-08
9          playAbility_MAX       useBody      52.79   9 3.208954e-08
10                      ed       useBody      48.08   7 3.438133e-08
11         isPlayingEnough       useBody      41.16   5 8.716846e-08
12            freqPlay_MAX       useBody      37.38   4 1.501423e-07
13      bodyImportant_ribs       useBody      31.52   5 7.403437e-06
14       bodyImportant_abs       useBody      28.47   5 2.948758e-05
15   bodyImportant_posture       useBody      27.53   5 4.490171e-05
16            dyspSymptoms       useBody     392.17 290 5.816679e-05
17 bodyImportant_accessory       useBody      24.46   5 1.767016e-04
18 bodyImportant_diaphragm       useBody      20.64   5 9.458551e-04
19             yrsPlay_MAX       useBody      12.31   4 1.518775e-02
20                      WI       useBody     325.25 281 3.557274e-02
21             countryLive     useDevice     160.56  38 5.249926e-17
22              influences     useDevice     222.56  87 7.694243e-14
23               countryEd     useDevice     132.19  37 1.266178e-12
24                      WI     useDevice     452.76 281 3.446307e-10
25          RMTImprovePerf     useDevice      49.43   5 1.811698e-09
26            freqPlay_MAX     useDevice      37.20   4 1.637909e-07
27                      ed     useDevice      42.97   7 3.387543e-07
28 bodyImportant_diaphragm     useDevice      35.59   5 1.149098e-06
29               role_MAX1     useDevice      29.42   3 1.831024e-06
30 bodyImportant_accessory     useDevice      28.87   5 2.462227e-05
31         playAbility_MAX     useDevice      34.60   9 7.012808e-05
32         isPlayingEnough     useDevice      20.55   5 9.846888e-04
33          breathingAware     useDevice      17.41   5 3.789938e-03
34                  gender     useDevice      12.77   3 5.149647e-03
35             yrsPlay_MAX     useDevice      13.57   4 8.793226e-03
36      bodyImportant_face     useDevice      14.17   5 1.458431e-02
37      bodyImportant_ribs     useDevice      12.09   5 3.357686e-02
38   bodyImportant_posture     useDevice      11.49   5 4.250673e-02
39              influences useInstrument     316.71  87 7.623631e-28
40            freqPlay_MAX useInstrument     104.94   4 8.709795e-22
41          breathingAware useInstrument     103.94   5 7.798486e-21
42               role_MAX1 useInstrument      77.91   3 8.622862e-17
43  bodyImportant_respMusc useInstrument      75.75   5 6.472526e-15
44   bodyImportant_airways useInstrument      66.27   5 6.105818e-13
45          RMTImprovePerf useInstrument      65.24   5 9.999100e-13
46       bodyImportant_abs useInstrument      55.43   5 1.062333e-10
47         playAbility_MAX useInstrument      51.70   9 5.146020e-08
48   bodyImportant_posture useInstrument      35.28   5 1.324426e-06
49                      ed useInstrument      34.77   7 1.238034e-05
50             countryLive useInstrument      82.83  38 3.558939e-05
51      bodyImportant_ribs useInstrument      27.40   5 4.767626e-05
52               countryEd useInstrument      78.02  37 9.376993e-05
53      bodyImportant_face useInstrument      20.18   5 1.157329e-03
54            dyspSymptoms useInstrument     359.09 290 3.516343e-03
55 bodyImportant_diaphragm useInstrument      16.96   5 4.571503e-03
56         isPlayingEnough useInstrument      13.97   5 1.583274e-02
57 bodyImportant_accessory useInstrument      12.48   5 2.877342e-02
   Significant
1         TRUE
2         TRUE
3         TRUE
4         TRUE
5         TRUE
6         TRUE
7         TRUE
8         TRUE
9         TRUE
10        TRUE
11        TRUE
12        TRUE
13        TRUE
14        TRUE
15        TRUE
16        TRUE
17        TRUE
18        TRUE
19        TRUE
20        TRUE
21        TRUE
22        TRUE
23        TRUE
24        TRUE
25        TRUE
26        TRUE
27        TRUE
28        TRUE
29        TRUE
30        TRUE
31        TRUE
32        TRUE
33        TRUE
34        TRUE
35        TRUE
36        TRUE
37        TRUE
38        TRUE
39        TRUE
40        TRUE
41        TRUE
42        TRUE
43        TRUE
44        TRUE
45        TRUE
46        TRUE
47        TRUE
48        TRUE
49        TRUE
50        TRUE
51        TRUE
52        TRUE
53        TRUE
54        TRUE
55        TRUE
56        TRUE
57        TRUE
Code
# Function to calculate Cramer's V
calculate_cramers_v <- function(predictor, outcome, data) {
  tbl <- table(data[[predictor]], data[[outcome]])
  chi <- chisq.test(tbl)
  n <- sum(tbl)
  min_dim <- min(dim(tbl)) - 1
  v <- sqrt(chi$statistic / (n * min_dim))
  return(as.numeric(v))
}

# Add Cramer's V to the significant results
significant_results$Cramers_V <- NA
for(i in 1:nrow(significant_results)) {
  sig <- significant_results[i, ]
  if(!is.na(sig$P_Value)) {
    significant_results$Cramers_V[i] <- calculate_cramers_v(sig$Predictor, sig$Outcome, df)
  }
}
significant_results <- significant_results %>% arrange(Outcome, P_Value)
print("Significant Predictors with Effect Size (Cramer's V):")
[1] "Significant Predictors with Effect Size (Cramer's V):"
Code
print(significant_results)
                 Predictor       Outcome Chi_Square  DF      P_Value
1           RMTImprovePerf       useBody     124.41   5 3.645885e-25
2               influences       useBody     264.91  87 7.341079e-20
3                role_MAX1       useBody      70.31   3 3.655891e-15
4           breathingAware       useBody      61.93   5 4.839614e-12
5                countryEd       useBody     119.33  37 1.359466e-10
6   bodyImportant_respMusc       useBody      54.38   5 1.751305e-10
7              countryLive       useBody     111.19  38 4.210649e-09
8    bodyImportant_airways       useBody      44.11   5 2.200168e-08
9          playAbility_MAX       useBody      52.79   9 3.208954e-08
10                      ed       useBody      48.08   7 3.438133e-08
11         isPlayingEnough       useBody      41.16   5 8.716846e-08
12            freqPlay_MAX       useBody      37.38   4 1.501423e-07
13      bodyImportant_ribs       useBody      31.52   5 7.403437e-06
14       bodyImportant_abs       useBody      28.47   5 2.948758e-05
15   bodyImportant_posture       useBody      27.53   5 4.490171e-05
16            dyspSymptoms       useBody     392.17 290 5.816679e-05
17 bodyImportant_accessory       useBody      24.46   5 1.767016e-04
18 bodyImportant_diaphragm       useBody      20.64   5 9.458551e-04
19             yrsPlay_MAX       useBody      12.31   4 1.518775e-02
20                      WI       useBody     325.25 281 3.557274e-02
21             countryLive     useDevice     160.56  38 5.249926e-17
22              influences     useDevice     222.56  87 7.694243e-14
23               countryEd     useDevice     132.19  37 1.266178e-12
24                      WI     useDevice     452.76 281 3.446307e-10
25          RMTImprovePerf     useDevice      49.43   5 1.811698e-09
26            freqPlay_MAX     useDevice      37.20   4 1.637909e-07
27                      ed     useDevice      42.97   7 3.387543e-07
28 bodyImportant_diaphragm     useDevice      35.59   5 1.149098e-06
29               role_MAX1     useDevice      29.42   3 1.831024e-06
30 bodyImportant_accessory     useDevice      28.87   5 2.462227e-05
31         playAbility_MAX     useDevice      34.60   9 7.012808e-05
32         isPlayingEnough     useDevice      20.55   5 9.846888e-04
33          breathingAware     useDevice      17.41   5 3.789938e-03
34                  gender     useDevice      12.77   3 5.149647e-03
35             yrsPlay_MAX     useDevice      13.57   4 8.793226e-03
36      bodyImportant_face     useDevice      14.17   5 1.458431e-02
37      bodyImportant_ribs     useDevice      12.09   5 3.357686e-02
38   bodyImportant_posture     useDevice      11.49   5 4.250673e-02
39              influences useInstrument     316.71  87 7.623631e-28
40            freqPlay_MAX useInstrument     104.94   4 8.709795e-22
41          breathingAware useInstrument     103.94   5 7.798486e-21
42               role_MAX1 useInstrument      77.91   3 8.622862e-17
43  bodyImportant_respMusc useInstrument      75.75   5 6.472526e-15
44   bodyImportant_airways useInstrument      66.27   5 6.105818e-13
45          RMTImprovePerf useInstrument      65.24   5 9.999100e-13
46       bodyImportant_abs useInstrument      55.43   5 1.062333e-10
47         playAbility_MAX useInstrument      51.70   9 5.146020e-08
48   bodyImportant_posture useInstrument      35.28   5 1.324426e-06
49                      ed useInstrument      34.77   7 1.238034e-05
50             countryLive useInstrument      82.83  38 3.558939e-05
51      bodyImportant_ribs useInstrument      27.40   5 4.767626e-05
52               countryEd useInstrument      78.02  37 9.376993e-05
53      bodyImportant_face useInstrument      20.18   5 1.157329e-03
54            dyspSymptoms useInstrument     359.09 290 3.516343e-03
55 bodyImportant_diaphragm useInstrument      16.96   5 4.571503e-03
56         isPlayingEnough useInstrument      13.97   5 1.583274e-02
57 bodyImportant_accessory useInstrument      12.48   5 2.877342e-02
   Significant  Cramers_V
1         TRUE 0.28258398
2         TRUE 0.41235136
3         TRUE 0.21244062
4         TRUE 0.19937939
5         TRUE 0.27675688
6         TRUE 0.18682438
7         TRUE 0.26714741
8         TRUE 0.16826145
9         TRUE 0.18406702
10        TRUE 0.17566627
11        TRUE 0.16253418
12        TRUE 0.15490230
13        TRUE 0.14222944
14        TRUE 0.13517310
15        TRUE 0.13293655
16        TRUE 0.53193240
17        TRUE 0.12531074
18        TRUE 0.11510815
19        TRUE 0.08888909
20        TRUE 0.45690504
21        TRUE 0.32101977
22        TRUE 0.37795703
23        TRUE 0.29128745
24        TRUE 0.53907426
25        TRUE 0.17812142
26        TRUE 0.15452198
27        TRUE 0.16606381
28        TRUE 0.15113236
29        TRUE 0.13740687
30        TRUE 0.13611864
31        TRUE 0.14901968
32        TRUE 0.11484930
33        TRUE 0.10569943
34        TRUE 0.09055126
35        TRUE 0.09333444
36        TRUE 0.09535667
37        TRUE 0.08809011
38        TRUE 0.08587203
39        TRUE 0.45086884
40        TRUE 0.25953344
41        TRUE 0.25829103
42        TRUE 0.22361857
43        TRUE 0.22050646
44        TRUE 0.20624246
45        TRUE 0.20463002
46        TRUE 0.18862861
47        TRUE 0.18216734
48        TRUE 0.15047539
49        TRUE 0.14937854
50        TRUE 0.23057560
51        TRUE 0.13261393
52        TRUE 0.22378447
53        TRUE 0.11380247
54        TRUE 0.50900108
55        TRUE 0.10434244
56        TRUE 0.09467560
57        TRUE 0.08949932
Code
# For detailed interpretation, show contingency tables for top 3 associations by effect size
significant_results_v <- significant_results %>% arrange(desc(Cramers_V))
cat("\nDetailed Analysis of Top 3 Associations (by Cramer's V):\n")

Detailed Analysis of Top 3 Associations (by Cramer's V):
Code
top_n <- min(3, nrow(significant_results_v))
for(i in 1:top_n) {
  pred <- significant_results_v$Predictor[i]
  outcome <- significant_results_v$Outcome[i]
  cat("\n", pred, "vs", outcome, "\n")
  cat("Contingency Table (Counts):\n")
  print(table(df[[pred]], df[[outcome]]))
  cat("\nContingency Table (Row Percentages):\n")
  prop_table <- prop.table(table(df[[pred]], df[[outcome]]), 1) * 100
  print(round(prop_table, 2))
}

 WI vs useDevice 
Contingency Table (Counts):
                                                                                                                      
                                                                                                                         0
  Bagpipes                                                                                                              16
  Bassoon                                                                                                               25
  Bassoon,Other                                                                                                          1
  Bassoon,Saxophone                                                                                                      5
  Bassoon,Saxophone,Tuba                                                                                                 1
  Bassoon,Trombone                                                                                                       1
  Bassoon,Trumpet,Trombone                                                                                               0
  Clarinet                                                                                                              98
  Clarinet,Bagpipes                                                                                                      2
  Clarinet,Bassoon                                                                                                       1
  Clarinet,Bassoon,Saxophone                                                                                             3
  Clarinet,Bassoon,Saxophone,Trombone                                                                                    1
  Clarinet,Bassoon,Trombone                                                                                              1
  Clarinet,Bassoon,Trombone,Tuba                                                                                         0
  Clarinet,Flute,Recorder,Saxophone                                                                                      1
  Clarinet,Flute,Saxophone,Other                                                                                         1
  Clarinet,French Horn,Trombone                                                                                          0
  Clarinet,Other                                                                                                         3
  Clarinet,Saxophone                                                                                                    47
  Clarinet,Saxophone,Bagpipes                                                                                            1
  Clarinet,Saxophone,Euphonium                                                                                           2
  Clarinet,Saxophone,Other                                                                                               2
  Clarinet,Saxophone,Trombone                                                                                            3
  Clarinet,Saxophone,Trumpet                                                                                             1
  Clarinet,Saxophone,Trumpet,Bagpipes                                                                                    0
  Clarinet,Saxophone,Trumpet,Trombone,Euphonium                                                                          2
  Clarinet,Saxophone,Trumpet,Trombone,Tuba,Euphonium                                                                     1
  Clarinet,Saxophone,Tuba                                                                                                1
  Clarinet,Saxophone,Tuba,Euphonium                                                                                      1
  Clarinet,Trumpet                                                                                                       7
  Clarinet,Trumpet,Euphonium                                                                                             1
  Clarinet,Trumpet,French Horn                                                                                           1
  Clarinet,Trumpet,French Horn,Other                                                                                     1
  Clarinet,Trumpet,Other                                                                                                 2
  Clarinet,Trumpet,Trombone                                                                                              1
  Clarinet,Trumpet,Trombone,Tuba,Euphonium                                                                               1
  Clarinet,Tuba                                                                                                          1
  Euphonium                                                                                                             11
  Flute                                                                                                                 87
  Flute,Bagpipes                                                                                                         3
  Flute,Bassoon,Saxophone,Trumpet,Bagpipes                                                                               0
  Flute,Bassoon,Trumpet,French Horn,Trombone,Euphonium                                                                   1
  Flute,Clarinet                                                                                                         8
  Flute,Clarinet,Bassoon,Saxophone                                                                                       1
  Flute,Clarinet,Bassoon,Saxophone,Trumpet,French Horn,Trombone,Tuba,Euphonium                                           1
  Flute,Clarinet,Bassoon,Saxophone,Trumpet,Trombone,Euphonium                                                            1
  Flute,Clarinet,Bassoon,Trumpet                                                                                         1
  Flute,Clarinet,Euphonium                                                                                               1
  Flute,Clarinet,Euphonium,Bagpipes                                                                                      1
  Flute,Clarinet,French Horn,Euphonium                                                                                   0
  Flute,Clarinet,Saxophone                                                                                              42
  Flute,Clarinet,Saxophone,Bagpipes                                                                                      1
  Flute,Clarinet,Saxophone,Euphonium                                                                                     1
  Flute,Clarinet,Saxophone,Trombone                                                                                      3
  Flute,Clarinet,Saxophone,Trumpet                                                                                       3
  Flute,Clarinet,Saxophone,Trumpet,Bagpipes                                                                              2
  Flute,Clarinet,Saxophone,Trumpet,French Horn                                                                           0
  Flute,Clarinet,Saxophone,Trumpet,French Horn,Trombone,Tuba,Euphonium                                                   2
  Flute,Clarinet,Saxophone,Trumpet,French Horn/Horn,Other                                                                1
  Flute,Clarinet,Saxophone,Trumpet,Tuba                                                                                  1
  Flute,Clarinet,Saxophone,Tuba                                                                                          0
  Flute,Clarinet,Trumpet,Euphonium                                                                                       0
  Flute,Clarinet,Trumpet,French Horn,Trombone,Euphonium                                                                  1
  Flute,Clarinet,Trumpet,Tuba,Other                                                                                      1
  Flute,Clarinet,Tuba                                                                                                    1
  Flute,Euphonium                                                                                                        2
  Flute,French Horn                                                                                                      1
  Flute,Oboe/Cor Anglais                                                                                                 3
  Flute,Oboe/Cor Anglais,Bagpipes                                                                                        1
  Flute,Oboe/Cor Anglais,Bassoon,Saxophone                                                                               1
  Flute,Oboe/Cor Anglais,Bassoon,Saxophone,Trombone,Tuba                                                                 1
  Flute,Oboe/Cor Anglais,Clarinet                                                                                        2
  Flute,Oboe/Cor Anglais,Clarinet,Bassoon,Saxophone                                                                      2
  Flute,Oboe/Cor Anglais,Clarinet,Bassoon,Saxophone,Trumpet,Euphonium,Other                                              1
  Flute,Oboe/Cor Anglais,Clarinet,Saxophone                                                                              1
  Flute,Oboe/Cor Anglais,Saxophone                                                                                       3
  Flute,Oboe/Cor Anglais,Saxophone,Bagpipes                                                                              1
  Flute,Other                                                                                                            3
  Flute,Piccolo                                                                                                         62
  Flute,Piccolo,Bassoon                                                                                                  2
  Flute,Piccolo,Clarinet                                                                                                 2
  Flute,Piccolo,Clarinet,Bassoon,Saxophone                                                                               3
  Flute,Piccolo,Clarinet,French Horn                                                                                     0
  Flute,Piccolo,Clarinet,Saxophone                                                                                       8
  Flute,Piccolo,Clarinet,Saxophone,Euphonium                                                                             0
  Flute,Piccolo,Clarinet,Saxophone,Other                                                                                 1
  Flute,Piccolo,Clarinet,Saxophone,Trumpet                                                                               1
  Flute,Piccolo,Clarinet,Saxophone,Trumpet,French Horn,Euphonium                                                         1
  Flute,Piccolo,Clarinet,Saxophone,Trumpet,Trombone                                                                      1
  Flute,Piccolo,Clarinet,Saxophone,Trumpet,Trombone,Euphonium                                                            1
  Flute,Piccolo,Oboe/Cor Anglais                                                                                         1
  Flute,Piccolo,Oboe/Cor Anglais,Bassoon,Trumpet,Trombone,Bagpipes                                                       0
  Flute,Piccolo,Oboe/Cor Anglais,Clarinet                                                                                1
  Flute,Piccolo,Oboe/Cor Anglais,Clarinet,Bassoon,Saxophone                                                              1
  Flute,Piccolo,Oboe/Cor Anglais,Clarinet,Bassoon,Saxophone,Trumpet,French Horn,Tuba                                     1
  Flute,Piccolo,Oboe/Cor Anglais,Clarinet,Saxophone                                                                      5
  Flute,Piccolo,Oboe/Cor Anglais,Saxophone                                                                               1
  Flute,Piccolo,Recorder                                                                                                 7
  Flute,Piccolo,Recorder,Bassoon                                                                                         0
  Flute,Piccolo,Recorder,Clarinet,Bassoon,Saxophone                                                                      1
  Flute,Piccolo,Recorder,Clarinet,Saxophone                                                                              3
  Flute,Piccolo,Recorder,Clarinet,Saxophone,Trumpet                                                                      2
  Flute,Piccolo,Recorder,Clarinet,Saxophone,Trumpet,French Horn,Trombone                                                 1
  Flute,Piccolo,Recorder,Clarinet,Saxophone,Trumpet,Trombone,Euphonium                                                   1
  Flute,Piccolo,Recorder,Oboe/Cor Anglais,Bassoon,French Horn                                                            1
  Flute,Piccolo,Recorder,Oboe/Cor Anglais,Clarinet,Bassoon                                                               0
  Flute,Piccolo,Recorder,Oboe/Cor Anglais,Clarinet,Bassoon,Saxophone                                                     1
  Flute,Piccolo,Recorder,Oboe/Cor Anglais,Clarinet,Bassoon,Saxophone,Trumpet,French Horn,Trombone,Tuba,Euphonium         0
  Flute,Piccolo,Recorder,Oboe/Cor Anglais,Clarinet,Bassoon,Saxophone,Trumpet,French Horn,Trombone,Tuba,Euphonium,Other   1
  Flute,Piccolo,Recorder,Oboe/Cor Anglais,Clarinet,Saxophone                                                             2
  Flute,Piccolo,Recorder,Oboe/Cor Anglais,Clarinet,Saxophone,Other                                                       1
  Flute,Piccolo,Recorder,Oboe/Cor Anglais,Clarinet,Saxophone,Trombone                                                    1
  Flute,Piccolo,Recorder,Other                                                                                           1
  Flute,Piccolo,Recorder,Saxophone                                                                                       1
  Flute,Piccolo,Recorder,Saxophone,Trombone                                                                              1
  Flute,Piccolo,Recorder,Saxophone,Trumpet,Euphonium                                                                     0
  Flute,Piccolo,Recorder,Trumpet                                                                                         1
  Flute,Piccolo,Saxophone                                                                                                8
  Flute,Piccolo,Saxophone,Other                                                                                          1
  Flute,Piccolo,Trumpet                                                                                                  2
  Flute,Piccolo,Trumpet,Bagpipes                                                                                         0
  Flute,Piccolo,Tuba                                                                                                     0
  Flute,Recorder                                                                                                         4
  Flute,Recorder,Clarinet                                                                                                2
  Flute,Recorder,Clarinet,Euphonium                                                                                      0
  Flute,Recorder,Clarinet,Saxophone                                                                                      6
  Flute,Recorder,Clarinet,Saxophone,Bagpipes                                                                             1
  Flute,Recorder,Clarinet,Saxophone,Other                                                                                0
  Flute,Recorder,Clarinet,Trombone,Tuba,Euphonium                                                                        1
  Flute,Recorder,Clarinet,Trumpet                                                                                        1
  Flute,Recorder,Clarinet,Trumpet,Trombone,Euphonium                                                                     2
  Flute,Recorder,Oboe/Cor Anglais,Clarinet,Saxophone,Other                                                               1
  Flute,Recorder,Oboe/Cor Anglais,Clarinet,Saxophone,Trumpet                                                             1
  Flute,Recorder,Oboe/Cor Anglais,Saxophone                                                                              0
  Flute,Recorder,Other                                                                                                   1
  Flute,Recorder,Saxophone                                                                                               3
  Flute,Recorder,Saxophone,Trumpet,French Horn                                                                           1
  Flute,Recorder,Trombone                                                                                                2
  Flute,Recorder,Trumpet,French Horn,Trombone,Euphonium                                                                  1
  Flute,Saxophone                                                                                                       19
  Flute,Saxophone,Other                                                                                                  2
  Flute,Saxophone,Trombone                                                                                               2
  Flute,Saxophone,Trumpet                                                                                                5
  Flute,Saxophone,Trumpet,French Horn                                                                                    0
  Flute,Trombone                                                                                                         1
  Flute,Trombone,Bagpipes                                                                                                1
  Flute,Trombone,Other                                                                                                   1
  Flute,Trumpet                                                                                                          6
  Flute,Trumpet,Bagpipes                                                                                                 1
  Flute,Trumpet,French Horn                                                                                              0
  Flute,Trumpet,Other                                                                                                    1
  Flute,Trumpet,Trombone                                                                                                 0
  Flute,Trumpet,Trombone,Tuba,Euphonium                                                                                  0
  Flute,Tuba                                                                                                             1
  French Horn                                                                                                           59
  French Horn,Bagpipes                                                                                                   2
  French Horn,Other                                                                                                      3
  French Horn,Trombone                                                                                                   2
  French Horn,Trombone,Tuba,Bagpipes                                                                                     0
  French Horn,Tuba                                                                                                       1
  Oboe/Cor Anglais                                                                                                      46
  Oboe/Cor Anglais,Bassoon                                                                                               4
  Oboe/Cor Anglais,Bassoon,Clarinet,Saxophone,Trumpet,French Horn,Trombone,Tuba,Euphonium,Other                          1
  Oboe/Cor Anglais,Bassoon,Saxophone,Trombone                                                                            1
  Oboe/Cor Anglais,Clarinet                                                                                              9
  Oboe/Cor Anglais,Clarinet,Bassoon                                                                                      1
  Oboe/Cor Anglais,Clarinet,Bassoon,Saxophone                                                                            2
  Oboe/Cor Anglais,Clarinet,Bassoon,Trumpet                                                                              1
  Oboe/Cor Anglais,Clarinet,French Horn                                                                                  1
  Oboe/Cor Anglais,Clarinet,Saxophone                                                                                    1
  Oboe/Cor Anglais,Clarinet,Trombone                                                                                     0
  Oboe/Cor Anglais,Clarinet,Trombone,Tuba                                                                                0
  Oboe/Cor Anglais,Clarinet,Tuba                                                                                         0
  Oboe/Cor Anglais,French Horn                                                                                           2
  Oboe/Cor Anglais,French Horn,Tuba,Euphonium                                                                            1
  Oboe/Cor Anglais,Saxophone                                                                                             5
  Oboe/Cor Anglais,Saxophone,Trombone                                                                                    1
  Oboe/Cor Anglais,Saxophone,Tuba                                                                                        1
  Oboe/Cor Anglais,Trumpet,Trombone                                                                                      1
  Other                                                                                                                 25
  Piccolo                                                                                                               18
  Piccolo,Bagpipes                                                                                                       3
  Piccolo,Bassoon,Saxophone,Tuba                                                                                         1
  Piccolo,Bassoon,Tuba                                                                                                   0
  Piccolo,Clarinet                                                                                                       1
  Piccolo,Oboe/Cor Anglais                                                                                               1
  Piccolo,Oboe/Cor Anglais,Bassoon,Bagpipes                                                                              0
  Piccolo,Oboe/Cor Anglais,Clarinet                                                                                      1
  Piccolo,Oboe/Cor Anglais,Clarinet,Bassoon                                                                              1
  Piccolo,Oboe/Cor Anglais,French Horn                                                                                   1
  Piccolo,Oboe/Cor Anglais,French Horn,Trombone                                                                          1
  Piccolo,Oboe/Cor Anglais,Saxophone,Trombone,Bagpipes                                                                   1
  Piccolo,Oboe/Cor Anglais,Trombone,Euphonium                                                                            0
  Piccolo,Oboe/Cor Anglais,Trumpet                                                                                       1
  Piccolo,Oboe/Cor Anglais,Trumpet,Trombone                                                                              0
  Piccolo,Recorder,Saxophone                                                                                             0
  Piccolo,Saxophone                                                                                                      4
  Piccolo,Saxophone,Bagpipes                                                                                             0
  Piccolo,Saxophone,Trombone                                                                                             0
  Piccolo,Trombone,Tuba,Bagpipes                                                                                         1
  Piccolo,Trumpet,Bagpipes                                                                                               2
  Piccolo,Trumpet,French Horn                                                                                            1
  Piccolo,Tuba                                                                                                           0
  Recorder                                                                                                               8
  Recorder,Bassoon,French Horn                                                                                           1
  Recorder,Bassoon,Trumpet                                                                                               0
  Recorder,Clarinet                                                                                                      8
  Recorder,Clarinet,Bassoon                                                                                              1
  Recorder,Clarinet,Bassoon,Saxophone                                                                                    1
  Recorder,Clarinet,Other                                                                                                2
  Recorder,Clarinet,Saxophone                                                                                           10
  Recorder,Clarinet,Saxophone,French Horn,Tuba,Euphonium,Bagpipes                                                        0
  Recorder,Clarinet,Saxophone,Other                                                                                      1
  Recorder,Clarinet,Saxophone,Trumpet                                                                                    1
  Recorder,Clarinet,Saxophone,Trumpet,French Horn,Trombone,Tuba,Euphonium,Other                                          1
  Recorder,Clarinet,Saxophone,Trumpet,Trombone                                                                           1
  Recorder,Clarinet,Trumpet                                                                                              0
  Recorder,Clarinet,Tuba                                                                                                 1
  Recorder,French Horn                                                                                                   1
  Recorder,French Horn,Other                                                                                             1
  Recorder,Oboe/Cor Anglais                                                                                              3
  Recorder,Oboe/Cor Anglais,Bassoon                                                                                      0
  Recorder,Oboe/Cor Anglais,Other                                                                                        1
  Recorder,Oboe/Cor Anglais,Saxophone                                                                                    1
  Recorder,Other                                                                                                         1
  Recorder,Saxophone                                                                                                     6
  Recorder,Saxophone,Trumpet                                                                                             1
  Recorder,Saxophone,Trumpet,French Horn                                                                                 0
  Recorder,Saxophone,Trumpet,French Horn,Trombone                                                                        1
  Recorder,Trombone                                                                                                      2
  Recorder,Trombone,Euphonium                                                                                            1
  Recorder,Trumpet                                                                                                       4
  Recorder,Trumpet,Euphonium                                                                                             0
  Recorder,Trumpet,French Horn,Trombone,Tuba,Euphonium,Bagpipes,Other                                                    1
  Recorder,Trumpet,Trombone                                                                                              2
  Recorder,Trumpet,Trombone,Other                                                                                        1
  Saxophone                                                                                                            123
  Saxophone,Bagpipes                                                                                                     2
  Saxophone,Euphonium                                                                                                    0
  Saxophone,French Horn                                                                                                  3
  Saxophone,French Horn,Trombone                                                                                         1
  Saxophone,Other                                                                                                        2
  Saxophone,Trombone                                                                                                     2
  Saxophone,Trombone,Tuba                                                                                                1
  Saxophone,Trombone,Tuba,Euphonium,Bagpipes                                                                             1
  Saxophone,Trumpet                                                                                                      5
  Saxophone,Trumpet,Euphonium                                                                                            0
  Saxophone,Trumpet,Trombone                                                                                             2
  Saxophone,Trumpet,Trombone,Euphonium                                                                                   1
  Saxophone,Tuba                                                                                                         3
  Trombone                                                                                                              41
  Trombone,Bagpipes                                                                                                      1
  Trombone,Euphonium                                                                                                    12
  Trombone,Other                                                                                                         2
  Trombone,Tuba                                                                                                          5
  Trombone,Tuba,Euphonium                                                                                                9
  Trumpet                                                                                                              113
  Trumpet,Bagpipes                                                                                                       1
  Trumpet,Euphonium                                                                                                      3
  Trumpet,Euphonium,Other                                                                                                2
  Trumpet,French Horn                                                                                                   10
  Trumpet,French Horn,Euphonium                                                                                          2
  Trumpet,French Horn,Other                                                                                              1
  Trumpet,French Horn,Trombone                                                                                           3
  Trumpet,French Horn,Trombone,Euphonium                                                                                 5
  Trumpet,French Horn,Trombone,Tuba                                                                                      1
  Trumpet,French Horn,Trombone,Tuba,Euphonium                                                                            2
  Trumpet,French Horn,Trombone,Tuba,Euphonium,Other                                                                      1
  Trumpet,French Horn,Tuba,Euphonium,Other                                                                               0
  Trumpet,Other                                                                                                         14
  Trumpet,Trombone                                                                                                      14
  Trumpet,Trombone,Euphonium                                                                                             1
  Trumpet,Trombone,Euphonium,Bagpipes                                                                                    0
  Trumpet,Trombone,Euphonium,Other                                                                                       2
  Trumpet,Trombone,Tuba                                                                                                  1
  Trumpet,Trombone,Tuba,Euphonium                                                                                        5
  Trumpet,Tuba                                                                                                           1
  Trumpet,Tuba,Bagpipes                                                                                                  1
  Trumpet,Tuba,Euphonium                                                                                                 1
  Tuba                                                                                                                  29
  Tuba,Euphonium                                                                                                         7
  Tuba,Other                                                                                                             1
                                                                                                                      
                                                                                                                         1
  Bagpipes                                                                                                               2
  Bassoon                                                                                                                3
  Bassoon,Other                                                                                                          0
  Bassoon,Saxophone                                                                                                      0
  Bassoon,Saxophone,Tuba                                                                                                 0
  Bassoon,Trombone                                                                                                       0
  Bassoon,Trumpet,Trombone                                                                                               1
  Clarinet                                                                                                               8
  Clarinet,Bagpipes                                                                                                      0
  Clarinet,Bassoon                                                                                                       0
  Clarinet,Bassoon,Saxophone                                                                                             0
  Clarinet,Bassoon,Saxophone,Trombone                                                                                    0
  Clarinet,Bassoon,Trombone                                                                                              0
  Clarinet,Bassoon,Trombone,Tuba                                                                                         1
  Clarinet,Flute,Recorder,Saxophone                                                                                      0
  Clarinet,Flute,Saxophone,Other                                                                                         0
  Clarinet,French Horn,Trombone                                                                                          1
  Clarinet,Other                                                                                                         0
  Clarinet,Saxophone                                                                                                     4
  Clarinet,Saxophone,Bagpipes                                                                                            0
  Clarinet,Saxophone,Euphonium                                                                                           0
  Clarinet,Saxophone,Other                                                                                               0
  Clarinet,Saxophone,Trombone                                                                                            0
  Clarinet,Saxophone,Trumpet                                                                                             0
  Clarinet,Saxophone,Trumpet,Bagpipes                                                                                    1
  Clarinet,Saxophone,Trumpet,Trombone,Euphonium                                                                          0
  Clarinet,Saxophone,Trumpet,Trombone,Tuba,Euphonium                                                                     0
  Clarinet,Saxophone,Tuba                                                                                                0
  Clarinet,Saxophone,Tuba,Euphonium                                                                                      0
  Clarinet,Trumpet                                                                                                       0
  Clarinet,Trumpet,Euphonium                                                                                             0
  Clarinet,Trumpet,French Horn                                                                                           0
  Clarinet,Trumpet,French Horn,Other                                                                                     0
  Clarinet,Trumpet,Other                                                                                                 0
  Clarinet,Trumpet,Trombone                                                                                              0
  Clarinet,Trumpet,Trombone,Tuba,Euphonium                                                                               0
  Clarinet,Tuba                                                                                                          0
  Euphonium                                                                                                              2
  Flute                                                                                                                  3
  Flute,Bagpipes                                                                                                         0
  Flute,Bassoon,Saxophone,Trumpet,Bagpipes                                                                               1
  Flute,Bassoon,Trumpet,French Horn,Trombone,Euphonium                                                                   0
  Flute,Clarinet                                                                                                         2
  Flute,Clarinet,Bassoon,Saxophone                                                                                       1
  Flute,Clarinet,Bassoon,Saxophone,Trumpet,French Horn,Trombone,Tuba,Euphonium                                           0
  Flute,Clarinet,Bassoon,Saxophone,Trumpet,Trombone,Euphonium                                                            0
  Flute,Clarinet,Bassoon,Trumpet                                                                                         0
  Flute,Clarinet,Euphonium                                                                                               0
  Flute,Clarinet,Euphonium,Bagpipes                                                                                      0
  Flute,Clarinet,French Horn,Euphonium                                                                                   1
  Flute,Clarinet,Saxophone                                                                                               4
  Flute,Clarinet,Saxophone,Bagpipes                                                                                      0
  Flute,Clarinet,Saxophone,Euphonium                                                                                     0
  Flute,Clarinet,Saxophone,Trombone                                                                                      0
  Flute,Clarinet,Saxophone,Trumpet                                                                                       0
  Flute,Clarinet,Saxophone,Trumpet,Bagpipes                                                                              0
  Flute,Clarinet,Saxophone,Trumpet,French Horn                                                                           1
  Flute,Clarinet,Saxophone,Trumpet,French Horn,Trombone,Tuba,Euphonium                                                   1
  Flute,Clarinet,Saxophone,Trumpet,French Horn/Horn,Other                                                                0
  Flute,Clarinet,Saxophone,Trumpet,Tuba                                                                                  0
  Flute,Clarinet,Saxophone,Tuba                                                                                          1
  Flute,Clarinet,Trumpet,Euphonium                                                                                       1
  Flute,Clarinet,Trumpet,French Horn,Trombone,Euphonium                                                                  0
  Flute,Clarinet,Trumpet,Tuba,Other                                                                                      0
  Flute,Clarinet,Tuba                                                                                                    0
  Flute,Euphonium                                                                                                        0
  Flute,French Horn                                                                                                      0
  Flute,Oboe/Cor Anglais                                                                                                 0
  Flute,Oboe/Cor Anglais,Bagpipes                                                                                        0
  Flute,Oboe/Cor Anglais,Bassoon,Saxophone                                                                               0
  Flute,Oboe/Cor Anglais,Bassoon,Saxophone,Trombone,Tuba                                                                 0
  Flute,Oboe/Cor Anglais,Clarinet                                                                                        1
  Flute,Oboe/Cor Anglais,Clarinet,Bassoon,Saxophone                                                                      0
  Flute,Oboe/Cor Anglais,Clarinet,Bassoon,Saxophone,Trumpet,Euphonium,Other                                              0
  Flute,Oboe/Cor Anglais,Clarinet,Saxophone                                                                              0
  Flute,Oboe/Cor Anglais,Saxophone                                                                                       1
  Flute,Oboe/Cor Anglais,Saxophone,Bagpipes                                                                              0
  Flute,Other                                                                                                            0
  Flute,Piccolo                                                                                                         14
  Flute,Piccolo,Bassoon                                                                                                  0
  Flute,Piccolo,Clarinet                                                                                                 0
  Flute,Piccolo,Clarinet,Bassoon,Saxophone                                                                               0
  Flute,Piccolo,Clarinet,French Horn                                                                                     2
  Flute,Piccolo,Clarinet,Saxophone                                                                                       1
  Flute,Piccolo,Clarinet,Saxophone,Euphonium                                                                             1
  Flute,Piccolo,Clarinet,Saxophone,Other                                                                                 0
  Flute,Piccolo,Clarinet,Saxophone,Trumpet                                                                               0
  Flute,Piccolo,Clarinet,Saxophone,Trumpet,French Horn,Euphonium                                                         0
  Flute,Piccolo,Clarinet,Saxophone,Trumpet,Trombone                                                                      0
  Flute,Piccolo,Clarinet,Saxophone,Trumpet,Trombone,Euphonium                                                            0
  Flute,Piccolo,Oboe/Cor Anglais                                                                                         0
  Flute,Piccolo,Oboe/Cor Anglais,Bassoon,Trumpet,Trombone,Bagpipes                                                       1
  Flute,Piccolo,Oboe/Cor Anglais,Clarinet                                                                                1
  Flute,Piccolo,Oboe/Cor Anglais,Clarinet,Bassoon,Saxophone                                                              1
  Flute,Piccolo,Oboe/Cor Anglais,Clarinet,Bassoon,Saxophone,Trumpet,French Horn,Tuba                                     0
  Flute,Piccolo,Oboe/Cor Anglais,Clarinet,Saxophone                                                                      0
  Flute,Piccolo,Oboe/Cor Anglais,Saxophone                                                                               0
  Flute,Piccolo,Recorder                                                                                                 2
  Flute,Piccolo,Recorder,Bassoon                                                                                         1
  Flute,Piccolo,Recorder,Clarinet,Bassoon,Saxophone                                                                      0
  Flute,Piccolo,Recorder,Clarinet,Saxophone                                                                              0
  Flute,Piccolo,Recorder,Clarinet,Saxophone,Trumpet                                                                      0
  Flute,Piccolo,Recorder,Clarinet,Saxophone,Trumpet,French Horn,Trombone                                                 0
  Flute,Piccolo,Recorder,Clarinet,Saxophone,Trumpet,Trombone,Euphonium                                                   0
  Flute,Piccolo,Recorder,Oboe/Cor Anglais,Bassoon,French Horn                                                            0
  Flute,Piccolo,Recorder,Oboe/Cor Anglais,Clarinet,Bassoon                                                               1
  Flute,Piccolo,Recorder,Oboe/Cor Anglais,Clarinet,Bassoon,Saxophone                                                     0
  Flute,Piccolo,Recorder,Oboe/Cor Anglais,Clarinet,Bassoon,Saxophone,Trumpet,French Horn,Trombone,Tuba,Euphonium         1
  Flute,Piccolo,Recorder,Oboe/Cor Anglais,Clarinet,Bassoon,Saxophone,Trumpet,French Horn,Trombone,Tuba,Euphonium,Other   0
  Flute,Piccolo,Recorder,Oboe/Cor Anglais,Clarinet,Saxophone                                                             0
  Flute,Piccolo,Recorder,Oboe/Cor Anglais,Clarinet,Saxophone,Other                                                       0
  Flute,Piccolo,Recorder,Oboe/Cor Anglais,Clarinet,Saxophone,Trombone                                                    0
  Flute,Piccolo,Recorder,Other                                                                                           0
  Flute,Piccolo,Recorder,Saxophone                                                                                       0
  Flute,Piccolo,Recorder,Saxophone,Trombone                                                                              0
  Flute,Piccolo,Recorder,Saxophone,Trumpet,Euphonium                                                                     1
  Flute,Piccolo,Recorder,Trumpet                                                                                         0
  Flute,Piccolo,Saxophone                                                                                                1
  Flute,Piccolo,Saxophone,Other                                                                                          0
  Flute,Piccolo,Trumpet                                                                                                  0
  Flute,Piccolo,Trumpet,Bagpipes                                                                                         1
  Flute,Piccolo,Tuba                                                                                                     1
  Flute,Recorder                                                                                                         1
  Flute,Recorder,Clarinet                                                                                                0
  Flute,Recorder,Clarinet,Euphonium                                                                                      1
  Flute,Recorder,Clarinet,Saxophone                                                                                      0
  Flute,Recorder,Clarinet,Saxophone,Bagpipes                                                                             0
  Flute,Recorder,Clarinet,Saxophone,Other                                                                                1
  Flute,Recorder,Clarinet,Trombone,Tuba,Euphonium                                                                        0
  Flute,Recorder,Clarinet,Trumpet                                                                                        0
  Flute,Recorder,Clarinet,Trumpet,Trombone,Euphonium                                                                     0
  Flute,Recorder,Oboe/Cor Anglais,Clarinet,Saxophone,Other                                                               0
  Flute,Recorder,Oboe/Cor Anglais,Clarinet,Saxophone,Trumpet                                                             0
  Flute,Recorder,Oboe/Cor Anglais,Saxophone                                                                              1
  Flute,Recorder,Other                                                                                                   0
  Flute,Recorder,Saxophone                                                                                               0
  Flute,Recorder,Saxophone,Trumpet,French Horn                                                                           0
  Flute,Recorder,Trombone                                                                                                0
  Flute,Recorder,Trumpet,French Horn,Trombone,Euphonium                                                                  0
  Flute,Saxophone                                                                                                        1
  Flute,Saxophone,Other                                                                                                  0
  Flute,Saxophone,Trombone                                                                                               0
  Flute,Saxophone,Trumpet                                                                                                2
  Flute,Saxophone,Trumpet,French Horn                                                                                    1
  Flute,Trombone                                                                                                         0
  Flute,Trombone,Bagpipes                                                                                                0
  Flute,Trombone,Other                                                                                                   0
  Flute,Trumpet                                                                                                          0
  Flute,Trumpet,Bagpipes                                                                                                 0
  Flute,Trumpet,French Horn                                                                                              1
  Flute,Trumpet,Other                                                                                                    0
  Flute,Trumpet,Trombone                                                                                                 1
  Flute,Trumpet,Trombone,Tuba,Euphonium                                                                                  1
  Flute,Tuba                                                                                                             0
  French Horn                                                                                                           16
  French Horn,Bagpipes                                                                                                   0
  French Horn,Other                                                                                                      1
  French Horn,Trombone                                                                                                   0
  French Horn,Trombone,Tuba,Bagpipes                                                                                     1
  French Horn,Tuba                                                                                                       0
  Oboe/Cor Anglais                                                                                                       4
  Oboe/Cor Anglais,Bassoon                                                                                               0
  Oboe/Cor Anglais,Bassoon,Clarinet,Saxophone,Trumpet,French Horn,Trombone,Tuba,Euphonium,Other                          0
  Oboe/Cor Anglais,Bassoon,Saxophone,Trombone                                                                            0
  Oboe/Cor Anglais,Clarinet                                                                                              2
  Oboe/Cor Anglais,Clarinet,Bassoon                                                                                      0
  Oboe/Cor Anglais,Clarinet,Bassoon,Saxophone                                                                            0
  Oboe/Cor Anglais,Clarinet,Bassoon,Trumpet                                                                              0
  Oboe/Cor Anglais,Clarinet,French Horn                                                                                  1
  Oboe/Cor Anglais,Clarinet,Saxophone                                                                                    2
  Oboe/Cor Anglais,Clarinet,Trombone                                                                                     1
  Oboe/Cor Anglais,Clarinet,Trombone,Tuba                                                                                1
  Oboe/Cor Anglais,Clarinet,Tuba                                                                                         1
  Oboe/Cor Anglais,French Horn                                                                                           0
  Oboe/Cor Anglais,French Horn,Tuba,Euphonium                                                                            0
  Oboe/Cor Anglais,Saxophone                                                                                             1
  Oboe/Cor Anglais,Saxophone,Trombone                                                                                    0
  Oboe/Cor Anglais,Saxophone,Tuba                                                                                        0
  Oboe/Cor Anglais,Trumpet,Trombone                                                                                      0
  Other                                                                                                                  1
  Piccolo                                                                                                                0
  Piccolo,Bagpipes                                                                                                       0
  Piccolo,Bassoon,Saxophone,Tuba                                                                                         0
  Piccolo,Bassoon,Tuba                                                                                                   1
  Piccolo,Clarinet                                                                                                       0
  Piccolo,Oboe/Cor Anglais                                                                                               0
  Piccolo,Oboe/Cor Anglais,Bassoon,Bagpipes                                                                              1
  Piccolo,Oboe/Cor Anglais,Clarinet                                                                                      0
  Piccolo,Oboe/Cor Anglais,Clarinet,Bassoon                                                                              0
  Piccolo,Oboe/Cor Anglais,French Horn                                                                                   0
  Piccolo,Oboe/Cor Anglais,French Horn,Trombone                                                                          0
  Piccolo,Oboe/Cor Anglais,Saxophone,Trombone,Bagpipes                                                                   0
  Piccolo,Oboe/Cor Anglais,Trombone,Euphonium                                                                            1
  Piccolo,Oboe/Cor Anglais,Trumpet                                                                                       0
  Piccolo,Oboe/Cor Anglais,Trumpet,Trombone                                                                              1
  Piccolo,Recorder,Saxophone                                                                                             2
  Piccolo,Saxophone                                                                                                      2
  Piccolo,Saxophone,Bagpipes                                                                                             1
  Piccolo,Saxophone,Trombone                                                                                             1
  Piccolo,Trombone,Tuba,Bagpipes                                                                                         0
  Piccolo,Trumpet,Bagpipes                                                                                               1
  Piccolo,Trumpet,French Horn                                                                                            0
  Piccolo,Tuba                                                                                                           1
  Recorder                                                                                                               0
  Recorder,Bassoon,French Horn                                                                                           0
  Recorder,Bassoon,Trumpet                                                                                               2
  Recorder,Clarinet                                                                                                      0
  Recorder,Clarinet,Bassoon                                                                                              0
  Recorder,Clarinet,Bassoon,Saxophone                                                                                    0
  Recorder,Clarinet,Other                                                                                                0
  Recorder,Clarinet,Saxophone                                                                                            0
  Recorder,Clarinet,Saxophone,French Horn,Tuba,Euphonium,Bagpipes                                                        1
  Recorder,Clarinet,Saxophone,Other                                                                                      0
  Recorder,Clarinet,Saxophone,Trumpet                                                                                    0
  Recorder,Clarinet,Saxophone,Trumpet,French Horn,Trombone,Tuba,Euphonium,Other                                          0
  Recorder,Clarinet,Saxophone,Trumpet,Trombone                                                                           0
  Recorder,Clarinet,Trumpet                                                                                              1
  Recorder,Clarinet,Tuba                                                                                                 0
  Recorder,French Horn                                                                                                   0
  Recorder,French Horn,Other                                                                                             0
  Recorder,Oboe/Cor Anglais                                                                                              0
  Recorder,Oboe/Cor Anglais,Bassoon                                                                                      1
  Recorder,Oboe/Cor Anglais,Other                                                                                        0
  Recorder,Oboe/Cor Anglais,Saxophone                                                                                    0
  Recorder,Other                                                                                                         0
  Recorder,Saxophone                                                                                                     0
  Recorder,Saxophone,Trumpet                                                                                             0
  Recorder,Saxophone,Trumpet,French Horn                                                                                 1
  Recorder,Saxophone,Trumpet,French Horn,Trombone                                                                        0
  Recorder,Trombone                                                                                                      0
  Recorder,Trombone,Euphonium                                                                                            0
  Recorder,Trumpet                                                                                                       0
  Recorder,Trumpet,Euphonium                                                                                             1
  Recorder,Trumpet,French Horn,Trombone,Tuba,Euphonium,Bagpipes,Other                                                    0
  Recorder,Trumpet,Trombone                                                                                              0
  Recorder,Trumpet,Trombone,Other                                                                                        0
  Saxophone                                                                                                             12
  Saxophone,Bagpipes                                                                                                     1
  Saxophone,Euphonium                                                                                                    1
  Saxophone,French Horn                                                                                                  2
  Saxophone,French Horn,Trombone                                                                                         0
  Saxophone,Other                                                                                                        0
  Saxophone,Trombone                                                                                                     0
  Saxophone,Trombone,Tuba                                                                                                0
  Saxophone,Trombone,Tuba,Euphonium,Bagpipes                                                                             0
  Saxophone,Trumpet                                                                                                      0
  Saxophone,Trumpet,Euphonium                                                                                            1
  Saxophone,Trumpet,Trombone                                                                                             1
  Saxophone,Trumpet,Trombone,Euphonium                                                                                   0
  Saxophone,Tuba                                                                                                         1
  Trombone                                                                                                               6
  Trombone,Bagpipes                                                                                                      0
  Trombone,Euphonium                                                                                                     5
  Trombone,Other                                                                                                         0
  Trombone,Tuba                                                                                                          1
  Trombone,Tuba,Euphonium                                                                                                9
  Trumpet                                                                                                               32
  Trumpet,Bagpipes                                                                                                       0
  Trumpet,Euphonium                                                                                                      1
  Trumpet,Euphonium,Other                                                                                                0
  Trumpet,French Horn                                                                                                    1
  Trumpet,French Horn,Euphonium                                                                                          0
  Trumpet,French Horn,Other                                                                                              0
  Trumpet,French Horn,Trombone                                                                                           0
  Trumpet,French Horn,Trombone,Euphonium                                                                                 0
  Trumpet,French Horn,Trombone,Tuba                                                                                      0
  Trumpet,French Horn,Trombone,Tuba,Euphonium                                                                            1
  Trumpet,French Horn,Trombone,Tuba,Euphonium,Other                                                                      0
  Trumpet,French Horn,Tuba,Euphonium,Other                                                                               1
  Trumpet,Other                                                                                                          0
  Trumpet,Trombone                                                                                                       1
  Trumpet,Trombone,Euphonium                                                                                             1
  Trumpet,Trombone,Euphonium,Bagpipes                                                                                    1
  Trumpet,Trombone,Euphonium,Other                                                                                       0
  Trumpet,Trombone,Tuba                                                                                                  1
  Trumpet,Trombone,Tuba,Euphonium                                                                                        0
  Trumpet,Tuba                                                                                                           0
  Trumpet,Tuba,Bagpipes                                                                                                  0
  Trumpet,Tuba,Euphonium                                                                                                 0
  Tuba                                                                                                                   7
  Tuba,Euphonium                                                                                                         1
  Tuba,Other                                                                                                             0

Contingency Table (Row Percentages):
                                                                                                                      
                                                                                                                            0
  Bagpipes                                                                                                              88.89
  Bassoon                                                                                                               89.29
  Bassoon,Other                                                                                                        100.00
  Bassoon,Saxophone                                                                                                    100.00
  Bassoon,Saxophone,Tuba                                                                                               100.00
  Bassoon,Trombone                                                                                                     100.00
  Bassoon,Trumpet,Trombone                                                                                               0.00
  Clarinet                                                                                                              92.45
  Clarinet,Bagpipes                                                                                                    100.00
  Clarinet,Bassoon                                                                                                     100.00
  Clarinet,Bassoon,Saxophone                                                                                           100.00
  Clarinet,Bassoon,Saxophone,Trombone                                                                                  100.00
  Clarinet,Bassoon,Trombone                                                                                            100.00
  Clarinet,Bassoon,Trombone,Tuba                                                                                         0.00
  Clarinet,Flute,Recorder,Saxophone                                                                                    100.00
  Clarinet,Flute,Saxophone,Other                                                                                       100.00
  Clarinet,French Horn,Trombone                                                                                          0.00
  Clarinet,Other                                                                                                       100.00
  Clarinet,Saxophone                                                                                                    92.16
  Clarinet,Saxophone,Bagpipes                                                                                          100.00
  Clarinet,Saxophone,Euphonium                                                                                         100.00
  Clarinet,Saxophone,Other                                                                                             100.00
  Clarinet,Saxophone,Trombone                                                                                          100.00
  Clarinet,Saxophone,Trumpet                                                                                           100.00
  Clarinet,Saxophone,Trumpet,Bagpipes                                                                                    0.00
  Clarinet,Saxophone,Trumpet,Trombone,Euphonium                                                                        100.00
  Clarinet,Saxophone,Trumpet,Trombone,Tuba,Euphonium                                                                   100.00
  Clarinet,Saxophone,Tuba                                                                                              100.00
  Clarinet,Saxophone,Tuba,Euphonium                                                                                    100.00
  Clarinet,Trumpet                                                                                                     100.00
  Clarinet,Trumpet,Euphonium                                                                                           100.00
  Clarinet,Trumpet,French Horn                                                                                         100.00
  Clarinet,Trumpet,French Horn,Other                                                                                   100.00
  Clarinet,Trumpet,Other                                                                                               100.00
  Clarinet,Trumpet,Trombone                                                                                            100.00
  Clarinet,Trumpet,Trombone,Tuba,Euphonium                                                                             100.00
  Clarinet,Tuba                                                                                                        100.00
  Euphonium                                                                                                             84.62
  Flute                                                                                                                 96.67
  Flute,Bagpipes                                                                                                       100.00
  Flute,Bassoon,Saxophone,Trumpet,Bagpipes                                                                               0.00
  Flute,Bassoon,Trumpet,French Horn,Trombone,Euphonium                                                                 100.00
  Flute,Clarinet                                                                                                        80.00
  Flute,Clarinet,Bassoon,Saxophone                                                                                      50.00
  Flute,Clarinet,Bassoon,Saxophone,Trumpet,French Horn,Trombone,Tuba,Euphonium                                         100.00
  Flute,Clarinet,Bassoon,Saxophone,Trumpet,Trombone,Euphonium                                                          100.00
  Flute,Clarinet,Bassoon,Trumpet                                                                                       100.00
  Flute,Clarinet,Euphonium                                                                                             100.00
  Flute,Clarinet,Euphonium,Bagpipes                                                                                    100.00
  Flute,Clarinet,French Horn,Euphonium                                                                                   0.00
  Flute,Clarinet,Saxophone                                                                                              91.30
  Flute,Clarinet,Saxophone,Bagpipes                                                                                    100.00
  Flute,Clarinet,Saxophone,Euphonium                                                                                   100.00
  Flute,Clarinet,Saxophone,Trombone                                                                                    100.00
  Flute,Clarinet,Saxophone,Trumpet                                                                                     100.00
  Flute,Clarinet,Saxophone,Trumpet,Bagpipes                                                                            100.00
  Flute,Clarinet,Saxophone,Trumpet,French Horn                                                                           0.00
  Flute,Clarinet,Saxophone,Trumpet,French Horn,Trombone,Tuba,Euphonium                                                  66.67
  Flute,Clarinet,Saxophone,Trumpet,French Horn/Horn,Other                                                              100.00
  Flute,Clarinet,Saxophone,Trumpet,Tuba                                                                                100.00
  Flute,Clarinet,Saxophone,Tuba                                                                                          0.00
  Flute,Clarinet,Trumpet,Euphonium                                                                                       0.00
  Flute,Clarinet,Trumpet,French Horn,Trombone,Euphonium                                                                100.00
  Flute,Clarinet,Trumpet,Tuba,Other                                                                                    100.00
  Flute,Clarinet,Tuba                                                                                                  100.00
  Flute,Euphonium                                                                                                      100.00
  Flute,French Horn                                                                                                    100.00
  Flute,Oboe/Cor Anglais                                                                                               100.00
  Flute,Oboe/Cor Anglais,Bagpipes                                                                                      100.00
  Flute,Oboe/Cor Anglais,Bassoon,Saxophone                                                                             100.00
  Flute,Oboe/Cor Anglais,Bassoon,Saxophone,Trombone,Tuba                                                               100.00
  Flute,Oboe/Cor Anglais,Clarinet                                                                                       66.67
  Flute,Oboe/Cor Anglais,Clarinet,Bassoon,Saxophone                                                                    100.00
  Flute,Oboe/Cor Anglais,Clarinet,Bassoon,Saxophone,Trumpet,Euphonium,Other                                            100.00
  Flute,Oboe/Cor Anglais,Clarinet,Saxophone                                                                            100.00
  Flute,Oboe/Cor Anglais,Saxophone                                                                                      75.00
  Flute,Oboe/Cor Anglais,Saxophone,Bagpipes                                                                            100.00
  Flute,Other                                                                                                          100.00
  Flute,Piccolo                                                                                                         81.58
  Flute,Piccolo,Bassoon                                                                                                100.00
  Flute,Piccolo,Clarinet                                                                                               100.00
  Flute,Piccolo,Clarinet,Bassoon,Saxophone                                                                             100.00
  Flute,Piccolo,Clarinet,French Horn                                                                                     0.00
  Flute,Piccolo,Clarinet,Saxophone                                                                                      88.89
  Flute,Piccolo,Clarinet,Saxophone,Euphonium                                                                             0.00
  Flute,Piccolo,Clarinet,Saxophone,Other                                                                               100.00
  Flute,Piccolo,Clarinet,Saxophone,Trumpet                                                                             100.00
  Flute,Piccolo,Clarinet,Saxophone,Trumpet,French Horn,Euphonium                                                       100.00
  Flute,Piccolo,Clarinet,Saxophone,Trumpet,Trombone                                                                    100.00
  Flute,Piccolo,Clarinet,Saxophone,Trumpet,Trombone,Euphonium                                                          100.00
  Flute,Piccolo,Oboe/Cor Anglais                                                                                       100.00
  Flute,Piccolo,Oboe/Cor Anglais,Bassoon,Trumpet,Trombone,Bagpipes                                                       0.00
  Flute,Piccolo,Oboe/Cor Anglais,Clarinet                                                                               50.00
  Flute,Piccolo,Oboe/Cor Anglais,Clarinet,Bassoon,Saxophone                                                             50.00
  Flute,Piccolo,Oboe/Cor Anglais,Clarinet,Bassoon,Saxophone,Trumpet,French Horn,Tuba                                   100.00
  Flute,Piccolo,Oboe/Cor Anglais,Clarinet,Saxophone                                                                    100.00
  Flute,Piccolo,Oboe/Cor Anglais,Saxophone                                                                             100.00
  Flute,Piccolo,Recorder                                                                                                77.78
  Flute,Piccolo,Recorder,Bassoon                                                                                         0.00
  Flute,Piccolo,Recorder,Clarinet,Bassoon,Saxophone                                                                    100.00
  Flute,Piccolo,Recorder,Clarinet,Saxophone                                                                            100.00
  Flute,Piccolo,Recorder,Clarinet,Saxophone,Trumpet                                                                    100.00
  Flute,Piccolo,Recorder,Clarinet,Saxophone,Trumpet,French Horn,Trombone                                               100.00
  Flute,Piccolo,Recorder,Clarinet,Saxophone,Trumpet,Trombone,Euphonium                                                 100.00
  Flute,Piccolo,Recorder,Oboe/Cor Anglais,Bassoon,French Horn                                                          100.00
  Flute,Piccolo,Recorder,Oboe/Cor Anglais,Clarinet,Bassoon                                                               0.00
  Flute,Piccolo,Recorder,Oboe/Cor Anglais,Clarinet,Bassoon,Saxophone                                                   100.00
  Flute,Piccolo,Recorder,Oboe/Cor Anglais,Clarinet,Bassoon,Saxophone,Trumpet,French Horn,Trombone,Tuba,Euphonium         0.00
  Flute,Piccolo,Recorder,Oboe/Cor Anglais,Clarinet,Bassoon,Saxophone,Trumpet,French Horn,Trombone,Tuba,Euphonium,Other 100.00
  Flute,Piccolo,Recorder,Oboe/Cor Anglais,Clarinet,Saxophone                                                           100.00
  Flute,Piccolo,Recorder,Oboe/Cor Anglais,Clarinet,Saxophone,Other                                                     100.00
  Flute,Piccolo,Recorder,Oboe/Cor Anglais,Clarinet,Saxophone,Trombone                                                  100.00
  Flute,Piccolo,Recorder,Other                                                                                         100.00
  Flute,Piccolo,Recorder,Saxophone                                                                                     100.00
  Flute,Piccolo,Recorder,Saxophone,Trombone                                                                            100.00
  Flute,Piccolo,Recorder,Saxophone,Trumpet,Euphonium                                                                     0.00
  Flute,Piccolo,Recorder,Trumpet                                                                                       100.00
  Flute,Piccolo,Saxophone                                                                                               88.89
  Flute,Piccolo,Saxophone,Other                                                                                        100.00
  Flute,Piccolo,Trumpet                                                                                                100.00
  Flute,Piccolo,Trumpet,Bagpipes                                                                                         0.00
  Flute,Piccolo,Tuba                                                                                                     0.00
  Flute,Recorder                                                                                                        80.00
  Flute,Recorder,Clarinet                                                                                              100.00
  Flute,Recorder,Clarinet,Euphonium                                                                                      0.00
  Flute,Recorder,Clarinet,Saxophone                                                                                    100.00
  Flute,Recorder,Clarinet,Saxophone,Bagpipes                                                                           100.00
  Flute,Recorder,Clarinet,Saxophone,Other                                                                                0.00
  Flute,Recorder,Clarinet,Trombone,Tuba,Euphonium                                                                      100.00
  Flute,Recorder,Clarinet,Trumpet                                                                                      100.00
  Flute,Recorder,Clarinet,Trumpet,Trombone,Euphonium                                                                   100.00
  Flute,Recorder,Oboe/Cor Anglais,Clarinet,Saxophone,Other                                                             100.00
  Flute,Recorder,Oboe/Cor Anglais,Clarinet,Saxophone,Trumpet                                                           100.00
  Flute,Recorder,Oboe/Cor Anglais,Saxophone                                                                              0.00
  Flute,Recorder,Other                                                                                                 100.00
  Flute,Recorder,Saxophone                                                                                             100.00
  Flute,Recorder,Saxophone,Trumpet,French Horn                                                                         100.00
  Flute,Recorder,Trombone                                                                                              100.00
  Flute,Recorder,Trumpet,French Horn,Trombone,Euphonium                                                                100.00
  Flute,Saxophone                                                                                                       95.00
  Flute,Saxophone,Other                                                                                                100.00
  Flute,Saxophone,Trombone                                                                                             100.00
  Flute,Saxophone,Trumpet                                                                                               71.43
  Flute,Saxophone,Trumpet,French Horn                                                                                    0.00
  Flute,Trombone                                                                                                       100.00
  Flute,Trombone,Bagpipes                                                                                              100.00
  Flute,Trombone,Other                                                                                                 100.00
  Flute,Trumpet                                                                                                        100.00
  Flute,Trumpet,Bagpipes                                                                                               100.00
  Flute,Trumpet,French Horn                                                                                              0.00
  Flute,Trumpet,Other                                                                                                  100.00
  Flute,Trumpet,Trombone                                                                                                 0.00
  Flute,Trumpet,Trombone,Tuba,Euphonium                                                                                  0.00
  Flute,Tuba                                                                                                           100.00
  French Horn                                                                                                           78.67
  French Horn,Bagpipes                                                                                                 100.00
  French Horn,Other                                                                                                     75.00
  French Horn,Trombone                                                                                                 100.00
  French Horn,Trombone,Tuba,Bagpipes                                                                                     0.00
  French Horn,Tuba                                                                                                     100.00
  Oboe/Cor Anglais                                                                                                      92.00
  Oboe/Cor Anglais,Bassoon                                                                                             100.00
  Oboe/Cor Anglais,Bassoon,Clarinet,Saxophone,Trumpet,French Horn,Trombone,Tuba,Euphonium,Other                        100.00
  Oboe/Cor Anglais,Bassoon,Saxophone,Trombone                                                                          100.00
  Oboe/Cor Anglais,Clarinet                                                                                             81.82
  Oboe/Cor Anglais,Clarinet,Bassoon                                                                                    100.00
  Oboe/Cor Anglais,Clarinet,Bassoon,Saxophone                                                                          100.00
  Oboe/Cor Anglais,Clarinet,Bassoon,Trumpet                                                                            100.00
  Oboe/Cor Anglais,Clarinet,French Horn                                                                                 50.00
  Oboe/Cor Anglais,Clarinet,Saxophone                                                                                   33.33
  Oboe/Cor Anglais,Clarinet,Trombone                                                                                     0.00
  Oboe/Cor Anglais,Clarinet,Trombone,Tuba                                                                                0.00
  Oboe/Cor Anglais,Clarinet,Tuba                                                                                         0.00
  Oboe/Cor Anglais,French Horn                                                                                         100.00
  Oboe/Cor Anglais,French Horn,Tuba,Euphonium                                                                          100.00
  Oboe/Cor Anglais,Saxophone                                                                                            83.33
  Oboe/Cor Anglais,Saxophone,Trombone                                                                                  100.00
  Oboe/Cor Anglais,Saxophone,Tuba                                                                                      100.00
  Oboe/Cor Anglais,Trumpet,Trombone                                                                                    100.00
  Other                                                                                                                 96.15
  Piccolo                                                                                                              100.00
  Piccolo,Bagpipes                                                                                                     100.00
  Piccolo,Bassoon,Saxophone,Tuba                                                                                       100.00
  Piccolo,Bassoon,Tuba                                                                                                   0.00
  Piccolo,Clarinet                                                                                                     100.00
  Piccolo,Oboe/Cor Anglais                                                                                             100.00
  Piccolo,Oboe/Cor Anglais,Bassoon,Bagpipes                                                                              0.00
  Piccolo,Oboe/Cor Anglais,Clarinet                                                                                    100.00
  Piccolo,Oboe/Cor Anglais,Clarinet,Bassoon                                                                            100.00
  Piccolo,Oboe/Cor Anglais,French Horn                                                                                 100.00
  Piccolo,Oboe/Cor Anglais,French Horn,Trombone                                                                        100.00
  Piccolo,Oboe/Cor Anglais,Saxophone,Trombone,Bagpipes                                                                 100.00
  Piccolo,Oboe/Cor Anglais,Trombone,Euphonium                                                                            0.00
  Piccolo,Oboe/Cor Anglais,Trumpet                                                                                     100.00
  Piccolo,Oboe/Cor Anglais,Trumpet,Trombone                                                                              0.00
  Piccolo,Recorder,Saxophone                                                                                             0.00
  Piccolo,Saxophone                                                                                                     66.67
  Piccolo,Saxophone,Bagpipes                                                                                             0.00
  Piccolo,Saxophone,Trombone                                                                                             0.00
  Piccolo,Trombone,Tuba,Bagpipes                                                                                       100.00
  Piccolo,Trumpet,Bagpipes                                                                                              66.67
  Piccolo,Trumpet,French Horn                                                                                          100.00
  Piccolo,Tuba                                                                                                           0.00
  Recorder                                                                                                             100.00
  Recorder,Bassoon,French Horn                                                                                         100.00
  Recorder,Bassoon,Trumpet                                                                                               0.00
  Recorder,Clarinet                                                                                                    100.00
  Recorder,Clarinet,Bassoon                                                                                            100.00
  Recorder,Clarinet,Bassoon,Saxophone                                                                                  100.00
  Recorder,Clarinet,Other                                                                                              100.00
  Recorder,Clarinet,Saxophone                                                                                          100.00
  Recorder,Clarinet,Saxophone,French Horn,Tuba,Euphonium,Bagpipes                                                        0.00
  Recorder,Clarinet,Saxophone,Other                                                                                    100.00
  Recorder,Clarinet,Saxophone,Trumpet                                                                                  100.00
  Recorder,Clarinet,Saxophone,Trumpet,French Horn,Trombone,Tuba,Euphonium,Other                                        100.00
  Recorder,Clarinet,Saxophone,Trumpet,Trombone                                                                         100.00
  Recorder,Clarinet,Trumpet                                                                                              0.00
  Recorder,Clarinet,Tuba                                                                                               100.00
  Recorder,French Horn                                                                                                 100.00
  Recorder,French Horn,Other                                                                                           100.00
  Recorder,Oboe/Cor Anglais                                                                                            100.00
  Recorder,Oboe/Cor Anglais,Bassoon                                                                                      0.00
  Recorder,Oboe/Cor Anglais,Other                                                                                      100.00
  Recorder,Oboe/Cor Anglais,Saxophone                                                                                  100.00
  Recorder,Other                                                                                                       100.00
  Recorder,Saxophone                                                                                                   100.00
  Recorder,Saxophone,Trumpet                                                                                           100.00
  Recorder,Saxophone,Trumpet,French Horn                                                                                 0.00
  Recorder,Saxophone,Trumpet,French Horn,Trombone                                                                      100.00
  Recorder,Trombone                                                                                                    100.00
  Recorder,Trombone,Euphonium                                                                                          100.00
  Recorder,Trumpet                                                                                                     100.00
  Recorder,Trumpet,Euphonium                                                                                             0.00
  Recorder,Trumpet,French Horn,Trombone,Tuba,Euphonium,Bagpipes,Other                                                  100.00
  Recorder,Trumpet,Trombone                                                                                            100.00
  Recorder,Trumpet,Trombone,Other                                                                                      100.00
  Saxophone                                                                                                             91.11
  Saxophone,Bagpipes                                                                                                    66.67
  Saxophone,Euphonium                                                                                                    0.00
  Saxophone,French Horn                                                                                                 60.00
  Saxophone,French Horn,Trombone                                                                                       100.00
  Saxophone,Other                                                                                                      100.00
  Saxophone,Trombone                                                                                                   100.00
  Saxophone,Trombone,Tuba                                                                                              100.00
  Saxophone,Trombone,Tuba,Euphonium,Bagpipes                                                                           100.00
  Saxophone,Trumpet                                                                                                    100.00
  Saxophone,Trumpet,Euphonium                                                                                            0.00
  Saxophone,Trumpet,Trombone                                                                                            66.67
  Saxophone,Trumpet,Trombone,Euphonium                                                                                 100.00
  Saxophone,Tuba                                                                                                        75.00
  Trombone                                                                                                              87.23
  Trombone,Bagpipes                                                                                                    100.00
  Trombone,Euphonium                                                                                                    70.59
  Trombone,Other                                                                                                       100.00
  Trombone,Tuba                                                                                                         83.33
  Trombone,Tuba,Euphonium                                                                                               50.00
  Trumpet                                                                                                               77.93
  Trumpet,Bagpipes                                                                                                     100.00
  Trumpet,Euphonium                                                                                                     75.00
  Trumpet,Euphonium,Other                                                                                              100.00
  Trumpet,French Horn                                                                                                   90.91
  Trumpet,French Horn,Euphonium                                                                                        100.00
  Trumpet,French Horn,Other                                                                                            100.00
  Trumpet,French Horn,Trombone                                                                                         100.00
  Trumpet,French Horn,Trombone,Euphonium                                                                               100.00
  Trumpet,French Horn,Trombone,Tuba                                                                                    100.00
  Trumpet,French Horn,Trombone,Tuba,Euphonium                                                                           66.67
  Trumpet,French Horn,Trombone,Tuba,Euphonium,Other                                                                    100.00
  Trumpet,French Horn,Tuba,Euphonium,Other                                                                               0.00
  Trumpet,Other                                                                                                        100.00
  Trumpet,Trombone                                                                                                      93.33
  Trumpet,Trombone,Euphonium                                                                                            50.00
  Trumpet,Trombone,Euphonium,Bagpipes                                                                                    0.00
  Trumpet,Trombone,Euphonium,Other                                                                                     100.00
  Trumpet,Trombone,Tuba                                                                                                 50.00
  Trumpet,Trombone,Tuba,Euphonium                                                                                      100.00
  Trumpet,Tuba                                                                                                         100.00
  Trumpet,Tuba,Bagpipes                                                                                                100.00
  Trumpet,Tuba,Euphonium                                                                                               100.00
  Tuba                                                                                                                  80.56
  Tuba,Euphonium                                                                                                        87.50
  Tuba,Other                                                                                                           100.00
                                                                                                                      
                                                                                                                            1
  Bagpipes                                                                                                              11.11
  Bassoon                                                                                                               10.71
  Bassoon,Other                                                                                                          0.00
  Bassoon,Saxophone                                                                                                      0.00
  Bassoon,Saxophone,Tuba                                                                                                 0.00
  Bassoon,Trombone                                                                                                       0.00
  Bassoon,Trumpet,Trombone                                                                                             100.00
  Clarinet                                                                                                               7.55
  Clarinet,Bagpipes                                                                                                      0.00
  Clarinet,Bassoon                                                                                                       0.00
  Clarinet,Bassoon,Saxophone                                                                                             0.00
  Clarinet,Bassoon,Saxophone,Trombone                                                                                    0.00
  Clarinet,Bassoon,Trombone                                                                                              0.00
  Clarinet,Bassoon,Trombone,Tuba                                                                                       100.00
  Clarinet,Flute,Recorder,Saxophone                                                                                      0.00
  Clarinet,Flute,Saxophone,Other                                                                                         0.00
  Clarinet,French Horn,Trombone                                                                                        100.00
  Clarinet,Other                                                                                                         0.00
  Clarinet,Saxophone                                                                                                     7.84
  Clarinet,Saxophone,Bagpipes                                                                                            0.00
  Clarinet,Saxophone,Euphonium                                                                                           0.00
  Clarinet,Saxophone,Other                                                                                               0.00
  Clarinet,Saxophone,Trombone                                                                                            0.00
  Clarinet,Saxophone,Trumpet                                                                                             0.00
  Clarinet,Saxophone,Trumpet,Bagpipes                                                                                  100.00
  Clarinet,Saxophone,Trumpet,Trombone,Euphonium                                                                          0.00
  Clarinet,Saxophone,Trumpet,Trombone,Tuba,Euphonium                                                                     0.00
  Clarinet,Saxophone,Tuba                                                                                                0.00
  Clarinet,Saxophone,Tuba,Euphonium                                                                                      0.00
  Clarinet,Trumpet                                                                                                       0.00
  Clarinet,Trumpet,Euphonium                                                                                             0.00
  Clarinet,Trumpet,French Horn                                                                                           0.00
  Clarinet,Trumpet,French Horn,Other                                                                                     0.00
  Clarinet,Trumpet,Other                                                                                                 0.00
  Clarinet,Trumpet,Trombone                                                                                              0.00
  Clarinet,Trumpet,Trombone,Tuba,Euphonium                                                                               0.00
  Clarinet,Tuba                                                                                                          0.00
  Euphonium                                                                                                             15.38
  Flute                                                                                                                  3.33
  Flute,Bagpipes                                                                                                         0.00
  Flute,Bassoon,Saxophone,Trumpet,Bagpipes                                                                             100.00
  Flute,Bassoon,Trumpet,French Horn,Trombone,Euphonium                                                                   0.00
  Flute,Clarinet                                                                                                        20.00
  Flute,Clarinet,Bassoon,Saxophone                                                                                      50.00
  Flute,Clarinet,Bassoon,Saxophone,Trumpet,French Horn,Trombone,Tuba,Euphonium                                           0.00
  Flute,Clarinet,Bassoon,Saxophone,Trumpet,Trombone,Euphonium                                                            0.00
  Flute,Clarinet,Bassoon,Trumpet                                                                                         0.00
  Flute,Clarinet,Euphonium                                                                                               0.00
  Flute,Clarinet,Euphonium,Bagpipes                                                                                      0.00
  Flute,Clarinet,French Horn,Euphonium                                                                                 100.00
  Flute,Clarinet,Saxophone                                                                                               8.70
  Flute,Clarinet,Saxophone,Bagpipes                                                                                      0.00
  Flute,Clarinet,Saxophone,Euphonium                                                                                     0.00
  Flute,Clarinet,Saxophone,Trombone                                                                                      0.00
  Flute,Clarinet,Saxophone,Trumpet                                                                                       0.00
  Flute,Clarinet,Saxophone,Trumpet,Bagpipes                                                                              0.00
  Flute,Clarinet,Saxophone,Trumpet,French Horn                                                                         100.00
  Flute,Clarinet,Saxophone,Trumpet,French Horn,Trombone,Tuba,Euphonium                                                  33.33
  Flute,Clarinet,Saxophone,Trumpet,French Horn/Horn,Other                                                                0.00
  Flute,Clarinet,Saxophone,Trumpet,Tuba                                                                                  0.00
  Flute,Clarinet,Saxophone,Tuba                                                                                        100.00
  Flute,Clarinet,Trumpet,Euphonium                                                                                     100.00
  Flute,Clarinet,Trumpet,French Horn,Trombone,Euphonium                                                                  0.00
  Flute,Clarinet,Trumpet,Tuba,Other                                                                                      0.00
  Flute,Clarinet,Tuba                                                                                                    0.00
  Flute,Euphonium                                                                                                        0.00
  Flute,French Horn                                                                                                      0.00
  Flute,Oboe/Cor Anglais                                                                                                 0.00
  Flute,Oboe/Cor Anglais,Bagpipes                                                                                        0.00
  Flute,Oboe/Cor Anglais,Bassoon,Saxophone                                                                               0.00
  Flute,Oboe/Cor Anglais,Bassoon,Saxophone,Trombone,Tuba                                                                 0.00
  Flute,Oboe/Cor Anglais,Clarinet                                                                                       33.33
  Flute,Oboe/Cor Anglais,Clarinet,Bassoon,Saxophone                                                                      0.00
  Flute,Oboe/Cor Anglais,Clarinet,Bassoon,Saxophone,Trumpet,Euphonium,Other                                              0.00
  Flute,Oboe/Cor Anglais,Clarinet,Saxophone                                                                              0.00
  Flute,Oboe/Cor Anglais,Saxophone                                                                                      25.00
  Flute,Oboe/Cor Anglais,Saxophone,Bagpipes                                                                              0.00
  Flute,Other                                                                                                            0.00
  Flute,Piccolo                                                                                                         18.42
  Flute,Piccolo,Bassoon                                                                                                  0.00
  Flute,Piccolo,Clarinet                                                                                                 0.00
  Flute,Piccolo,Clarinet,Bassoon,Saxophone                                                                               0.00
  Flute,Piccolo,Clarinet,French Horn                                                                                   100.00
  Flute,Piccolo,Clarinet,Saxophone                                                                                      11.11
  Flute,Piccolo,Clarinet,Saxophone,Euphonium                                                                           100.00
  Flute,Piccolo,Clarinet,Saxophone,Other                                                                                 0.00
  Flute,Piccolo,Clarinet,Saxophone,Trumpet                                                                               0.00
  Flute,Piccolo,Clarinet,Saxophone,Trumpet,French Horn,Euphonium                                                         0.00
  Flute,Piccolo,Clarinet,Saxophone,Trumpet,Trombone                                                                      0.00
  Flute,Piccolo,Clarinet,Saxophone,Trumpet,Trombone,Euphonium                                                            0.00
  Flute,Piccolo,Oboe/Cor Anglais                                                                                         0.00
  Flute,Piccolo,Oboe/Cor Anglais,Bassoon,Trumpet,Trombone,Bagpipes                                                     100.00
  Flute,Piccolo,Oboe/Cor Anglais,Clarinet                                                                               50.00
  Flute,Piccolo,Oboe/Cor Anglais,Clarinet,Bassoon,Saxophone                                                             50.00
  Flute,Piccolo,Oboe/Cor Anglais,Clarinet,Bassoon,Saxophone,Trumpet,French Horn,Tuba                                     0.00
  Flute,Piccolo,Oboe/Cor Anglais,Clarinet,Saxophone                                                                      0.00
  Flute,Piccolo,Oboe/Cor Anglais,Saxophone                                                                               0.00
  Flute,Piccolo,Recorder                                                                                                22.22
  Flute,Piccolo,Recorder,Bassoon                                                                                       100.00
  Flute,Piccolo,Recorder,Clarinet,Bassoon,Saxophone                                                                      0.00
  Flute,Piccolo,Recorder,Clarinet,Saxophone                                                                              0.00
  Flute,Piccolo,Recorder,Clarinet,Saxophone,Trumpet                                                                      0.00
  Flute,Piccolo,Recorder,Clarinet,Saxophone,Trumpet,French Horn,Trombone                                                 0.00
  Flute,Piccolo,Recorder,Clarinet,Saxophone,Trumpet,Trombone,Euphonium                                                   0.00
  Flute,Piccolo,Recorder,Oboe/Cor Anglais,Bassoon,French Horn                                                            0.00
  Flute,Piccolo,Recorder,Oboe/Cor Anglais,Clarinet,Bassoon                                                             100.00
  Flute,Piccolo,Recorder,Oboe/Cor Anglais,Clarinet,Bassoon,Saxophone                                                     0.00
  Flute,Piccolo,Recorder,Oboe/Cor Anglais,Clarinet,Bassoon,Saxophone,Trumpet,French Horn,Trombone,Tuba,Euphonium       100.00
  Flute,Piccolo,Recorder,Oboe/Cor Anglais,Clarinet,Bassoon,Saxophone,Trumpet,French Horn,Trombone,Tuba,Euphonium,Other   0.00
  Flute,Piccolo,Recorder,Oboe/Cor Anglais,Clarinet,Saxophone                                                             0.00
  Flute,Piccolo,Recorder,Oboe/Cor Anglais,Clarinet,Saxophone,Other                                                       0.00
  Flute,Piccolo,Recorder,Oboe/Cor Anglais,Clarinet,Saxophone,Trombone                                                    0.00
  Flute,Piccolo,Recorder,Other                                                                                           0.00
  Flute,Piccolo,Recorder,Saxophone                                                                                       0.00
  Flute,Piccolo,Recorder,Saxophone,Trombone                                                                              0.00
  Flute,Piccolo,Recorder,Saxophone,Trumpet,Euphonium                                                                   100.00
  Flute,Piccolo,Recorder,Trumpet                                                                                         0.00
  Flute,Piccolo,Saxophone                                                                                               11.11
  Flute,Piccolo,Saxophone,Other                                                                                          0.00
  Flute,Piccolo,Trumpet                                                                                                  0.00
  Flute,Piccolo,Trumpet,Bagpipes                                                                                       100.00
  Flute,Piccolo,Tuba                                                                                                   100.00
  Flute,Recorder                                                                                                        20.00
  Flute,Recorder,Clarinet                                                                                                0.00
  Flute,Recorder,Clarinet,Euphonium                                                                                    100.00
  Flute,Recorder,Clarinet,Saxophone                                                                                      0.00
  Flute,Recorder,Clarinet,Saxophone,Bagpipes                                                                             0.00
  Flute,Recorder,Clarinet,Saxophone,Other                                                                              100.00
  Flute,Recorder,Clarinet,Trombone,Tuba,Euphonium                                                                        0.00
  Flute,Recorder,Clarinet,Trumpet                                                                                        0.00
  Flute,Recorder,Clarinet,Trumpet,Trombone,Euphonium                                                                     0.00
  Flute,Recorder,Oboe/Cor Anglais,Clarinet,Saxophone,Other                                                               0.00
  Flute,Recorder,Oboe/Cor Anglais,Clarinet,Saxophone,Trumpet                                                             0.00
  Flute,Recorder,Oboe/Cor Anglais,Saxophone                                                                            100.00
  Flute,Recorder,Other                                                                                                   0.00
  Flute,Recorder,Saxophone                                                                                               0.00
  Flute,Recorder,Saxophone,Trumpet,French Horn                                                                           0.00
  Flute,Recorder,Trombone                                                                                                0.00
  Flute,Recorder,Trumpet,French Horn,Trombone,Euphonium                                                                  0.00
  Flute,Saxophone                                                                                                        5.00
  Flute,Saxophone,Other                                                                                                  0.00
  Flute,Saxophone,Trombone                                                                                               0.00
  Flute,Saxophone,Trumpet                                                                                               28.57
  Flute,Saxophone,Trumpet,French Horn                                                                                  100.00
  Flute,Trombone                                                                                                         0.00
  Flute,Trombone,Bagpipes                                                                                                0.00
  Flute,Trombone,Other                                                                                                   0.00
  Flute,Trumpet                                                                                                          0.00
  Flute,Trumpet,Bagpipes                                                                                                 0.00
  Flute,Trumpet,French Horn                                                                                            100.00
  Flute,Trumpet,Other                                                                                                    0.00
  Flute,Trumpet,Trombone                                                                                               100.00
  Flute,Trumpet,Trombone,Tuba,Euphonium                                                                                100.00
  Flute,Tuba                                                                                                             0.00
  French Horn                                                                                                           21.33
  French Horn,Bagpipes                                                                                                   0.00
  French Horn,Other                                                                                                     25.00
  French Horn,Trombone                                                                                                   0.00
  French Horn,Trombone,Tuba,Bagpipes                                                                                   100.00
  French Horn,Tuba                                                                                                       0.00
  Oboe/Cor Anglais                                                                                                       8.00
  Oboe/Cor Anglais,Bassoon                                                                                               0.00
  Oboe/Cor Anglais,Bassoon,Clarinet,Saxophone,Trumpet,French Horn,Trombone,Tuba,Euphonium,Other                          0.00
  Oboe/Cor Anglais,Bassoon,Saxophone,Trombone                                                                            0.00
  Oboe/Cor Anglais,Clarinet                                                                                             18.18
  Oboe/Cor Anglais,Clarinet,Bassoon                                                                                      0.00
  Oboe/Cor Anglais,Clarinet,Bassoon,Saxophone                                                                            0.00
  Oboe/Cor Anglais,Clarinet,Bassoon,Trumpet                                                                              0.00
  Oboe/Cor Anglais,Clarinet,French Horn                                                                                 50.00
  Oboe/Cor Anglais,Clarinet,Saxophone                                                                                   66.67
  Oboe/Cor Anglais,Clarinet,Trombone                                                                                   100.00
  Oboe/Cor Anglais,Clarinet,Trombone,Tuba                                                                              100.00
  Oboe/Cor Anglais,Clarinet,Tuba                                                                                       100.00
  Oboe/Cor Anglais,French Horn                                                                                           0.00
  Oboe/Cor Anglais,French Horn,Tuba,Euphonium                                                                            0.00
  Oboe/Cor Anglais,Saxophone                                                                                            16.67
  Oboe/Cor Anglais,Saxophone,Trombone                                                                                    0.00
  Oboe/Cor Anglais,Saxophone,Tuba                                                                                        0.00
  Oboe/Cor Anglais,Trumpet,Trombone                                                                                      0.00
  Other                                                                                                                  3.85
  Piccolo                                                                                                                0.00
  Piccolo,Bagpipes                                                                                                       0.00
  Piccolo,Bassoon,Saxophone,Tuba                                                                                         0.00
  Piccolo,Bassoon,Tuba                                                                                                 100.00
  Piccolo,Clarinet                                                                                                       0.00
  Piccolo,Oboe/Cor Anglais                                                                                               0.00
  Piccolo,Oboe/Cor Anglais,Bassoon,Bagpipes                                                                            100.00
  Piccolo,Oboe/Cor Anglais,Clarinet                                                                                      0.00
  Piccolo,Oboe/Cor Anglais,Clarinet,Bassoon                                                                              0.00
  Piccolo,Oboe/Cor Anglais,French Horn                                                                                   0.00
  Piccolo,Oboe/Cor Anglais,French Horn,Trombone                                                                          0.00
  Piccolo,Oboe/Cor Anglais,Saxophone,Trombone,Bagpipes                                                                   0.00
  Piccolo,Oboe/Cor Anglais,Trombone,Euphonium                                                                          100.00
  Piccolo,Oboe/Cor Anglais,Trumpet                                                                                       0.00
  Piccolo,Oboe/Cor Anglais,Trumpet,Trombone                                                                            100.00
  Piccolo,Recorder,Saxophone                                                                                           100.00
  Piccolo,Saxophone                                                                                                     33.33
  Piccolo,Saxophone,Bagpipes                                                                                           100.00
  Piccolo,Saxophone,Trombone                                                                                           100.00
  Piccolo,Trombone,Tuba,Bagpipes                                                                                         0.00
  Piccolo,Trumpet,Bagpipes                                                                                              33.33
  Piccolo,Trumpet,French Horn                                                                                            0.00
  Piccolo,Tuba                                                                                                         100.00
  Recorder                                                                                                               0.00
  Recorder,Bassoon,French Horn                                                                                           0.00
  Recorder,Bassoon,Trumpet                                                                                             100.00
  Recorder,Clarinet                                                                                                      0.00
  Recorder,Clarinet,Bassoon                                                                                              0.00
  Recorder,Clarinet,Bassoon,Saxophone                                                                                    0.00
  Recorder,Clarinet,Other                                                                                                0.00
  Recorder,Clarinet,Saxophone                                                                                            0.00
  Recorder,Clarinet,Saxophone,French Horn,Tuba,Euphonium,Bagpipes                                                      100.00
  Recorder,Clarinet,Saxophone,Other                                                                                      0.00
  Recorder,Clarinet,Saxophone,Trumpet                                                                                    0.00
  Recorder,Clarinet,Saxophone,Trumpet,French Horn,Trombone,Tuba,Euphonium,Other                                          0.00
  Recorder,Clarinet,Saxophone,Trumpet,Trombone                                                                           0.00
  Recorder,Clarinet,Trumpet                                                                                            100.00
  Recorder,Clarinet,Tuba                                                                                                 0.00
  Recorder,French Horn                                                                                                   0.00
  Recorder,French Horn,Other                                                                                             0.00
  Recorder,Oboe/Cor Anglais                                                                                              0.00
  Recorder,Oboe/Cor Anglais,Bassoon                                                                                    100.00
  Recorder,Oboe/Cor Anglais,Other                                                                                        0.00
  Recorder,Oboe/Cor Anglais,Saxophone                                                                                    0.00
  Recorder,Other                                                                                                         0.00
  Recorder,Saxophone                                                                                                     0.00
  Recorder,Saxophone,Trumpet                                                                                             0.00
  Recorder,Saxophone,Trumpet,French Horn                                                                               100.00
  Recorder,Saxophone,Trumpet,French Horn,Trombone                                                                        0.00
  Recorder,Trombone                                                                                                      0.00
  Recorder,Trombone,Euphonium                                                                                            0.00
  Recorder,Trumpet                                                                                                       0.00
  Recorder,Trumpet,Euphonium                                                                                           100.00
  Recorder,Trumpet,French Horn,Trombone,Tuba,Euphonium,Bagpipes,Other                                                    0.00
  Recorder,Trumpet,Trombone                                                                                              0.00
  Recorder,Trumpet,Trombone,Other                                                                                        0.00
  Saxophone                                                                                                              8.89
  Saxophone,Bagpipes                                                                                                    33.33
  Saxophone,Euphonium                                                                                                  100.00
  Saxophone,French Horn                                                                                                 40.00
  Saxophone,French Horn,Trombone                                                                                         0.00
  Saxophone,Other                                                                                                        0.00
  Saxophone,Trombone                                                                                                     0.00
  Saxophone,Trombone,Tuba                                                                                                0.00
  Saxophone,Trombone,Tuba,Euphonium,Bagpipes                                                                             0.00
  Saxophone,Trumpet                                                                                                      0.00
  Saxophone,Trumpet,Euphonium                                                                                          100.00
  Saxophone,Trumpet,Trombone                                                                                            33.33
  Saxophone,Trumpet,Trombone,Euphonium                                                                                   0.00
  Saxophone,Tuba                                                                                                        25.00
  Trombone                                                                                                              12.77
  Trombone,Bagpipes                                                                                                      0.00
  Trombone,Euphonium                                                                                                    29.41
  Trombone,Other                                                                                                         0.00
  Trombone,Tuba                                                                                                         16.67
  Trombone,Tuba,Euphonium                                                                                               50.00
  Trumpet                                                                                                               22.07
  Trumpet,Bagpipes                                                                                                       0.00
  Trumpet,Euphonium                                                                                                     25.00
  Trumpet,Euphonium,Other                                                                                                0.00
  Trumpet,French Horn                                                                                                    9.09
  Trumpet,French Horn,Euphonium                                                                                          0.00
  Trumpet,French Horn,Other                                                                                              0.00
  Trumpet,French Horn,Trombone                                                                                           0.00
  Trumpet,French Horn,Trombone,Euphonium                                                                                 0.00
  Trumpet,French Horn,Trombone,Tuba                                                                                      0.00
  Trumpet,French Horn,Trombone,Tuba,Euphonium                                                                           33.33
  Trumpet,French Horn,Trombone,Tuba,Euphonium,Other                                                                      0.00
  Trumpet,French Horn,Tuba,Euphonium,Other                                                                             100.00
  Trumpet,Other                                                                                                          0.00
  Trumpet,Trombone                                                                                                       6.67
  Trumpet,Trombone,Euphonium                                                                                            50.00
  Trumpet,Trombone,Euphonium,Bagpipes                                                                                  100.00
  Trumpet,Trombone,Euphonium,Other                                                                                       0.00
  Trumpet,Trombone,Tuba                                                                                                 50.00
  Trumpet,Trombone,Tuba,Euphonium                                                                                        0.00
  Trumpet,Tuba                                                                                                           0.00
  Trumpet,Tuba,Bagpipes                                                                                                  0.00
  Trumpet,Tuba,Euphonium                                                                                                 0.00
  Tuba                                                                                                                  19.44
  Tuba,Euphonium                                                                                                        12.50
  Tuba,Other                                                                                                             0.00

 dyspSymptoms vs useBody 
Contingency Table (Counts):
                                                                                                                                                                         
                                                                                                                                                                           0
  Air hunger                                                                                                                                                              17
  Air hunger,Breathing a lot/Unplanned breaths                                                                                                                             5
  Air hunger,Breathing a lot/Unplanned breaths,Can't finish phrases                                                                                                       12
  Air hunger,Can't finish phrases                                                                                                                                         20
  Air hunger,Can't finish phrases,Other                                                                                                                                    2
  Air hunger,Chest tightness                                                                                                                                               3
  Air hunger,Chest tightness,Breathing a lot/Unplanned breaths                                                                                                             0
  Air hunger,Chest tightness,Breathing a lot/Unplanned breaths,Can't finish phrases                                                                                        1
  Air hunger,Chest tightness,Can't finish phrases                                                                                                                          4
  Air hunger,Chest tightness,Mental breathing effort                                                                                                                       0
  Air hunger,Chest tightness,Mental breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases                                                                1
  Air hunger,Chest tightness,Mental breathing effort,Unplanned breaths                                                                                                     0
  Air hunger,Chest tightness,Unplanned breaths                                                                                                                             0
  Air hunger,Chest tightness,Unplanned breaths,Can't finish phrases                                                                                                        0
  Air hunger,Mental breathing effort                                                                                                                                       6
  Air hunger,Mental breathing effort,Breathing a lot/Unplanned breaths                                                                                                     0
  Air hunger,Mental breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases                                                                                5
  Air hunger,Mental breathing effort,Can't finish phrases                                                                                                                  2
  Air hunger,Mental breathing effort,Unplanned breaths                                                                                                                     2
  Air hunger,Unplanned breaths                                                                                                                                             2
  Air hunger,Unplanned breaths,Can't finish phrases                                                                                                                        4
  Breathing a lot/Unplanned breaths                                                                                                                                        9
  Breathing a lot/Unplanned breaths,Can't finish phrases                                                                                                                  31
  Breathing a lot/Unplanned breaths,Other                                                                                                                                  1
  Breathing discomfort                                                                                                                                                    12
  Breathing discomfort,Air hunger                                                                                                                                          2
  Breathing discomfort,Air hunger,Breathing a lot/Unplanned breaths                                                                                                        2
  Breathing discomfort,Air hunger,Breathing a lot/Unplanned breaths,Can't finish phrases                                                                                   1
  Breathing discomfort,Air hunger,Can't finish phrases                                                                                                                     4
  Breathing discomfort,Air hunger,Chest tightness                                                                                                                          1
  Breathing discomfort,Air hunger,Chest tightness,Breathing a lot/Unplanned breaths                                                                                        1
  Breathing discomfort,Air hunger,Chest tightness,Breathing a lot/Unplanned breaths,Can't finish phrases                                                                   1
  Breathing discomfort,Air hunger,Chest tightness,Can't finish phrases                                                                                                     1
  Breathing discomfort,Air hunger,Chest tightness,Mental breathing effort                                                                                                  0
  Breathing discomfort,Air hunger,Chest tightness,Mental breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases                                           0
  Breathing discomfort,Air hunger,Chest tightness,Mental breathing effort,Can't finish phrases                                                                             0
  Breathing discomfort,Air hunger,Mental breathing effort                                                                                                                  0
  Breathing discomfort,Air hunger,Mental breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases                                                           0
  Breathing discomfort,Air hunger,Mental breathing effort,Can't finish phrases                                                                                             0
  Breathing discomfort,Air hunger,Mental breathing effort,Unplanned breaths,Can't finish phrases                                                                           0
  Breathing discomfort,Air hunger,Other                                                                                                                                    1
  Breathing discomfort,Air hunger,Unplanned breaths                                                                                                                        2
  Breathing discomfort,Breathing a lot/Unplanned breaths                                                                                                                   1
  Breathing discomfort,Breathing a lot/Unplanned breaths,Can't finish phrases                                                                                              3
  Breathing discomfort,Can't finish phrases                                                                                                                                5
  Breathing discomfort,Chest tightness                                                                                                                                     8
  Breathing discomfort,Chest tightness,Breathing a lot/Unplanned breaths                                                                                                   0
  Breathing discomfort,Chest tightness,Can't finish phrases                                                                                                                2
  Breathing discomfort,Chest tightness,Mental breathing effort                                                                                                             3
  Breathing discomfort,Chest tightness,Mental breathing effort,Breathing a lot/Unplanned breaths                                                                           1
  Breathing discomfort,Chest tightness,Unplanned breaths                                                                                                                   1
  Breathing discomfort,Chest tightness,Unplanned breaths,Can't finish phrases                                                                                              1
  Breathing discomfort,Mental breathing effort                                                                                                                             0
  Breathing discomfort,Mental breathing effort,Can't finish phrases                                                                                                        1
  Breathing discomfort,Physical breathing effort                                                                                                                           3
  Breathing discomfort,Physical breathing effort,Air hunger                                                                                                                0
  Breathing discomfort,Physical breathing effort,Air hunger,Breathing a lot/Unplanned breaths,Can't finish phrases                                                         3
  Breathing discomfort,Physical breathing effort,Air hunger,Chest tightness,Mental breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases                 0
  Breathing discomfort,Physical breathing effort,Air hunger,Chest tightness,Mental breathing effort,Can't finish phrases                                                   0
  Breathing discomfort,Physical breathing effort,Air hunger,Chest tightness,Mental breathing effort,Unplanned breaths,Can't finish phrases                                 1
  Breathing discomfort,Physical breathing effort,Air hunger,Mental breathing effort                                                                                        1
  Breathing discomfort,Physical breathing effort,Air hunger,Mental breathing effort,Unplanned breaths                                                                      1
  Breathing discomfort,Physical breathing effort,Air hunger,Mental breathing effort,Unplanned breaths,Can't finish phrases                                                 1
  Breathing discomfort,Physical breathing effort,Breathing a lot/Unplanned breaths                                                                                         0
  Breathing discomfort,Physical breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases                                                                    1
  Breathing discomfort,Physical breathing effort,Can't finish phrases                                                                                                      1
  Breathing discomfort,Physical breathing effort,Chest tightness                                                                                                           2
  Breathing discomfort,Physical breathing effort,Chest tightness,Breathing a lot/Unplanned breaths                                                                         1
  Breathing discomfort,Physical breathing effort,Chest tightness,Breathing a lot/Unplanned breaths,Can't finish phrases                                                    1
  Breathing discomfort,Physical breathing effort,Chest tightness,Can't finish phrases                                                                                      0
  Breathing discomfort,Physical breathing effort,Chest tightness,Mental breathing effort                                                                                   0
  Breathing discomfort,Physical breathing effort,Chest tightness,Mental breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases                            0
  Breathing discomfort,Physical breathing effort,Chest tightness,Mental breathing effort,Unplanned breaths,Can't finish phrases                                            0
  Breathing discomfort,Physical breathing effort,Chest tightness,Unplanned breaths                                                                                         1
  Breathing discomfort,Physical breathing effort,Chest tightness,Unplanned breaths,Can't finish phrases                                                                    0
  Breathing discomfort,Physical breathing effort,Mental breathing effort,Breathing a lot/Unplanned breaths                                                                 2
  Breathing discomfort,Physical breathing effort,Mental breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases                                            1
  Breathing discomfort,Physical breathing effort,Mental breathing effort,Can't finish phrases                                                                              1
  Breathing discomfort,Physical breathing effort,Mental breathing effort,Unplanned breaths,Can't finish phrases                                                            0
  Breathing discomfort,Physical breathing effort,Unplanned breaths                                                                                                         0
  Breathing discomfort,Unplanned breaths                                                                                                                                   1
  Breathing discomfort,Unplanned breaths,Can't finish phrases                                                                                                              1
  Breathlessness                                                                                                                                                          16
  Breathlessness,Air hunger                                                                                                                                                5
  Breathlessness,Air hunger,Breathing a lot/Unplanned breaths                                                                                                              1
  Breathlessness,Air hunger,Breathing a lot/Unplanned breaths,Can't finish phrases                                                                                        23
  Breathlessness,Air hunger,Breathing a lot/Unplanned breaths,Can't finish phrases,Other                                                                                   1
  Breathlessness,Air hunger,Can't finish phrases                                                                                                                          13
  Breathlessness,Air hunger,Can't finish phrases,Other                                                                                                                     1
  Breathlessness,Air hunger,Chest tightness                                                                                                                                4
  Breathlessness,Air hunger,Chest tightness,Breathing a lot/Unplanned breaths                                                                                              1
  Breathlessness,Air hunger,Chest tightness,Breathing a lot/Unplanned breaths,Can't finish phrases                                                                         4
  Breathlessness,Air hunger,Chest tightness,Breathing a lot/Unplanned breaths,Other                                                                                        1
  Breathlessness,Air hunger,Chest tightness,Can't finish phrases                                                                                                           1
  Breathlessness,Air hunger,Chest tightness,Mental breathing effort                                                                                                        2
  Breathlessness,Air hunger,Chest tightness,Mental breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases                                                 3
  Breathlessness,Air hunger,Chest tightness,Mental breathing effort,Can't finish phrases                                                                                   1
  Breathlessness,Air hunger,Chest tightness,Unplanned breaths                                                                                                              0
  Breathlessness,Air hunger,Chest tightness,Unplanned breaths,Can't finish phrases                                                                                         2
  Breathlessness,Air hunger,Mental breathing effort                                                                                                                        1
  Breathlessness,Air hunger,Mental breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases                                                                 5
  Breathlessness,Air hunger,Mental breathing effort,Breathing a lot/Unplanned breaths,Other                                                                                1
  Breathlessness,Air hunger,Mental breathing effort,Can't finish phrases                                                                                                   2
  Breathlessness,Air hunger,Unplanned breaths,Can't finish phrases                                                                                                         4
  Breathlessness,Breathing a lot/Unplanned breaths                                                                                                                         4
  Breathlessness,Breathing a lot/Unplanned breaths,Can't finish phrases                                                                                                   11
  Breathlessness,Breathing a lot/Unplanned breaths,Can't finish phrases,Other                                                                                              1
  Breathlessness,Breathing discomfort                                                                                                                                      5
  Breathlessness,Breathing discomfort,Air hunger,Breathing a lot/Unplanned breaths                                                                                         1
  Breathlessness,Breathing discomfort,Air hunger,Breathing a lot/Unplanned breaths,Can't finish phrases                                                                    6
  Breathlessness,Breathing discomfort,Air hunger,Can't finish phrases                                                                                                      1
  Breathlessness,Breathing discomfort,Air hunger,Chest tightness                                                                                                           2
  Breathlessness,Breathing discomfort,Air hunger,Chest tightness,Breathing a lot/Unplanned breaths                                                                         1
  Breathlessness,Breathing discomfort,Air hunger,Chest tightness,Breathing a lot/Unplanned breaths,Can't finish phrases                                                    4
  Breathlessness,Breathing discomfort,Air hunger,Chest tightness,Can't finish phrases                                                                                      1
  Breathlessness,Breathing discomfort,Air hunger,Chest tightness,Mental breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases                            0
  Breathlessness,Breathing discomfort,Air hunger,Chest tightness,Mental breathing effort,Can't finish phrases                                                              0
  Breathlessness,Breathing discomfort,Air hunger,Chest tightness,Mental breathing effort,Unplanned breaths,Can't finish phrases                                            0
  Breathlessness,Breathing discomfort,Air hunger,Chest tightness,Unplanned breaths,Can't finish phrases                                                                    0
  Breathlessness,Breathing discomfort,Air hunger,Chest tightness,Unplanned breaths,Can't finish phrases,Other                                                              1
  Breathlessness,Breathing discomfort,Air hunger,Mental breathing effort                                                                                                   0
  Breathlessness,Breathing discomfort,Air hunger,Mental breathing effort,Unplanned breaths,Can't finish phrases                                                            0
  Breathlessness,Breathing discomfort,Air hunger,Other                                                                                                                     0
  Breathlessness,Breathing discomfort,Air hunger,Unplanned breaths,Can't finish phrases                                                                                    0
  Breathlessness,Breathing discomfort,Breathing a lot/Unplanned breaths,Can't finish phrases                                                                               2
  Breathlessness,Breathing discomfort,Can't finish phrases                                                                                                                 7
  Breathlessness,Breathing discomfort,Chest tightness                                                                                                                      2
  Breathlessness,Breathing discomfort,Chest tightness,Breathing a lot/Unplanned breaths                                                                                    0
  Breathlessness,Breathing discomfort,Chest tightness,Breathing a lot/Unplanned breaths,Can't finish phrases                                                               1
  Breathlessness,Breathing discomfort,Chest tightness,Can't finish phrases                                                                                                 2
  Breathlessness,Breathing discomfort,Chest tightness,Mental breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases                                       1
  Breathlessness,Breathing discomfort,Chest tightness,Mental breathing effort,Can't finish phrases                                                                         0
  Breathlessness,Breathing discomfort,Chest tightness,Unplanned breaths                                                                                                    0
  Breathlessness,Breathing discomfort,Chest tightness,Unplanned breaths,Can't finish phrases                                                                               0
  Breathlessness,Breathing discomfort,Mental breathing effort,Breathing a lot/Unplanned breaths                                                                            1
  Breathlessness,Breathing discomfort,Mental breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases                                                       0
  Breathlessness,Breathing discomfort,Mental breathing effort,Can't finish phrases                                                                                         5
  Breathlessness,Breathing discomfort,Physical breathing effort                                                                                                            0
  Breathlessness,Breathing discomfort,Physical breathing effort,Air hunger                                                                                                 1
  Breathlessness,Breathing discomfort,Physical breathing effort,Air hunger,Breathing a lot/Unplanned breaths                                                               1
  Breathlessness,Breathing discomfort,Physical breathing effort,Air hunger,Breathing a lot/Unplanned breaths,Can't finish phrases                                          5
  Breathlessness,Breathing discomfort,Physical breathing effort,Air hunger,Breathing a lot/Unplanned breaths,Can't finish phrases,Other                                    1
  Breathlessness,Breathing discomfort,Physical breathing effort,Air hunger,Can't finish phrases                                                                            1
  Breathlessness,Breathing discomfort,Physical breathing effort,Air hunger,Chest tightness                                                                                 2
  Breathlessness,Breathing discomfort,Physical breathing effort,Air hunger,Chest tightness,Breathing a lot/Unplanned breaths                                               0
  Breathlessness,Breathing discomfort,Physical breathing effort,Air hunger,Chest tightness,Breathing a lot/Unplanned breaths,Can't finish phrases                          1
  Breathlessness,Breathing discomfort,Physical breathing effort,Air hunger,Chest tightness,Can't finish phrases                                                            1
  Breathlessness,Breathing discomfort,Physical breathing effort,Air hunger,Chest tightness,Mental breathing effort                                                         1
  Breathlessness,Breathing discomfort,Physical breathing effort,Air hunger,Chest tightness,Mental breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases  8
  Breathlessness,Breathing discomfort,Physical breathing effort,Air hunger,Chest tightness,Mental breathing effort,Can't finish phrases                                    0
  Breathlessness,Breathing discomfort,Physical breathing effort,Air hunger,Chest tightness,Mental breathing effort,Unplanned breaths,Can't finish phrases                  5
  Breathlessness,Breathing discomfort,Physical breathing effort,Air hunger,Chest tightness,Unplanned breaths,Can't finish phrases                                          1
  Breathlessness,Breathing discomfort,Physical breathing effort,Air hunger,Mental breathing effort,Breathing a lot/Unplanned breaths                                       0
  Breathlessness,Breathing discomfort,Physical breathing effort,Air hunger,Mental breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases                  5
  Breathlessness,Breathing discomfort,Physical breathing effort,Air hunger,Mental breathing effort,Can't finish phrases                                                    1
  Breathlessness,Breathing discomfort,Physical breathing effort,Air hunger,Mental breathing effort,Unplanned breaths,Can't finish phrases                                  3
  Breathlessness,Breathing discomfort,Physical breathing effort,Air hunger,Unplanned breaths,Can't finish phrases                                                          2
  Breathlessness,Breathing discomfort,Physical breathing effort,Breathing a lot/Unplanned breaths                                                                          1
  Breathlessness,Breathing discomfort,Physical breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases                                                     4
  Breathlessness,Breathing discomfort,Physical breathing effort,Can't finish phrases                                                                                       2
  Breathlessness,Breathing discomfort,Physical breathing effort,Chest tightness                                                                                            0
  Breathlessness,Breathing discomfort,Physical breathing effort,Chest tightness,Breathing a lot/Unplanned breaths,Can't finish phrases                                     1
  Breathlessness,Breathing discomfort,Physical breathing effort,Chest tightness,Mental breathing effort                                                                    1
  Breathlessness,Breathing discomfort,Physical breathing effort,Chest tightness,Mental breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases             0
  Breathlessness,Breathing discomfort,Physical breathing effort,Chest tightness,Mental breathing effort,Can't finish phrases                                               0
  Breathlessness,Breathing discomfort,Physical breathing effort,Chest tightness,Mental breathing effort,Unplanned breaths,Can't finish phrases                             1
  Breathlessness,Breathing discomfort,Physical breathing effort,Mental breathing effort                                                                                    0
  Breathlessness,Breathing discomfort,Physical breathing effort,Mental breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases                             1
  Breathlessness,Breathing discomfort,Physical breathing effort,Mental breathing effort,Can't finish phrases                                                               0
  Breathlessness,Breathing discomfort,Physical breathing effort,Unplanned breaths                                                                                          0
  Breathlessness,Breathing discomfort,Physical breathing effort,Unplanned breaths,Can't finish phrases                                                                     0
  Breathlessness,Breathing discomfort,Unplanned breaths,Can't finish phrases                                                                                               1
  Breathlessness,Can't finish phrases                                                                                                                                     15
  Breathlessness,Can't finish phrases,Other                                                                                                                                0
  Breathlessness,Chest tightness                                                                                                                                           3
  Breathlessness,Chest tightness,Breathing a lot/Unplanned breaths                                                                                                         2
  Breathlessness,Chest tightness,Breathing a lot/Unplanned breaths,Can't finish phrases                                                                                    2
  Breathlessness,Chest tightness,Can't finish phrases                                                                                                                      9
  Breathlessness,Chest tightness,Mental breathing effort                                                                                                                   1
  Breathlessness,Chest tightness,Unplanned breaths,Can't finish phrases                                                                                                    1
  Breathlessness,Mental breathing effort                                                                                                                                   0
  Breathlessness,Mental breathing effort,Breathing a lot/Unplanned breaths                                                                                                 0
  Breathlessness,Mental breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases                                                                            0
  Breathlessness,Mental breathing effort,Can't finish phrases                                                                                                              5
  Breathlessness,Mental breathing effort,Unplanned breaths                                                                                                                 1
  Breathlessness,Mental breathing effort,Unplanned breaths,Can't finish phrases                                                                                            0
  Breathlessness,Other                                                                                                                                                     0
  Breathlessness,Physical breathing effort                                                                                                                                 7
  Breathlessness,Physical breathing effort,Air hunger                                                                                                                      0
  Breathlessness,Physical breathing effort,Air hunger,Breathing a lot/Unplanned breaths                                                                                    1
  Breathlessness,Physical breathing effort,Air hunger,Breathing a lot/Unplanned breaths,Can't finish phrases                                                               6
  Breathlessness,Physical breathing effort,Air hunger,Can't finish phrases                                                                                                 4
  Breathlessness,Physical breathing effort,Air hunger,Chest tightness                                                                                                      1
  Breathlessness,Physical breathing effort,Air hunger,Chest tightness,Breathing a lot/Unplanned breaths,Can't finish phrases                                               6
  Breathlessness,Physical breathing effort,Air hunger,Chest tightness,Breathing a lot/Unplanned breaths,Can't finish phrases,Other                                         0
  Breathlessness,Physical breathing effort,Air hunger,Chest tightness,Mental breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases                       4
  Breathlessness,Physical breathing effort,Air hunger,Chest tightness,Mental breathing effort,Can't finish phrases                                                         0
  Breathlessness,Physical breathing effort,Air hunger,Chest tightness,Mental breathing effort,Unplanned breaths,Can't finish phrases                                       0
  Breathlessness,Physical breathing effort,Air hunger,Chest tightness,Unplanned breaths                                                                                    1
  Breathlessness,Physical breathing effort,Air hunger,Chest tightness,Unplanned breaths,Can't finish phrases                                                               1
  Breathlessness,Physical breathing effort,Air hunger,Mental breathing effort                                                                                              1
  Breathlessness,Physical breathing effort,Air hunger,Mental breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases                                       1
  Breathlessness,Physical breathing effort,Air hunger,Mental breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases,Other                                 0
  Breathlessness,Physical breathing effort,Air hunger,Mental breathing effort,Can't finish phrases                                                                         3
  Breathlessness,Physical breathing effort,Air hunger,Mental breathing effort,Unplanned breaths,Can't finish phrases                                                       1
  Breathlessness,Physical breathing effort,Air hunger,Mental breathing effort,Unplanned breaths,Can't finish phrases,Other                                                 0
  Breathlessness,Physical breathing effort,Air hunger,Unplanned breaths,Can't finish phrases                                                                               2
  Breathlessness,Physical breathing effort,Breathing a lot/Unplanned breaths                                                                                               0
  Breathlessness,Physical breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases                                                                          4
  Breathlessness,Physical breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases,Other                                                                    1
  Breathlessness,Physical breathing effort,Can't finish phrases                                                                                                            5
  Breathlessness,Physical breathing effort,Chest tightness                                                                                                                 2
  Breathlessness,Physical breathing effort,Chest tightness,Breathing a lot/Unplanned breaths,Can't finish phrases                                                          1
  Breathlessness,Physical breathing effort,Chest tightness,Can't finish phrases                                                                                            1
  Breathlessness,Physical breathing effort,Chest tightness,Mental breathing effort                                                                                         1
  Breathlessness,Physical breathing effort,Chest tightness,Mental breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases                                  1
  Breathlessness,Physical breathing effort,Chest tightness,Unplanned breaths,Can't finish phrases                                                                          1
  Breathlessness,Physical breathing effort,Mental breathing effort,Breathing a lot/Unplanned breaths                                                                       1
  Breathlessness,Physical breathing effort,Mental breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases                                                  1
  Breathlessness,Physical breathing effort,Mental breathing effort,Can't finish phrases                                                                                    1
  Breathlessness,Physical breathing effort,Mental breathing effort,Unplanned breaths                                                                                       1
  Breathlessness,Physical breathing effort,Mental breathing effort,Unplanned breaths,Can't finish phrases                                                                  0
  Breathlessness,Physical breathing effort,Unplanned breaths,Can't finish phrases                                                                                          3
  Breathlessness,Unplanned breaths                                                                                                                                         0
  Breathlessness,Unplanned breaths,Can't finish phrases                                                                                                                    4
  Can't finish phrases                                                                                                                                                    64
  Can't finish phrases,Breathing discomfort                                                                                                                                1
  Can't finish phrases,Mental breathing effort                                                                                                                             1
  Can't finish phrases,Other                                                                                                                                               3
  Can't finish phrases,Unplanned breaths                                                                                                                                   0
  Chest tightness                                                                                                                                                         14
  Chest tightness,Breathing a lot/Unplanned breaths                                                                                                                        0
  Chest tightness,Breathing a lot/Unplanned breaths,Can't finish phrases                                                                                                   1
  Chest tightness,Can't finish phrases                                                                                                                                     3
  Chest tightness,Mental breathing effort                                                                                                                                  1
  Chest tightness,Mental breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases                                                                           1
  Chest tightness,Mental breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases,Other                                                                     0
  Chest tightness,Mental breathing effort,Can't finish phrases                                                                                                             1
  Chest tightness,Other                                                                                                                                                    0
  Chest tightness,Unplanned breaths                                                                                                                                        1
  Mental breathing effort                                                                                                                                                 13
  Mental breathing effort,Breathing a lot/Unplanned breaths                                                                                                                1
  Mental breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases                                                                                           3
  Mental breathing effort,Can't finish phrases                                                                                                                            10
  Mental breathing effort,Can't finish phrases,Other                                                                                                                       0
  Mental breathing effort,Other                                                                                                                                            0
  Mental breathing effort,Unplanned breaths,Can't finish phrases                                                                                                           1
  Misc/Unclear                                                                                                                                                             1
  None of the above                                                                                                                                                        0
  Other                                                                                                                                                                    1
  Physical breathing effort                                                                                                                                               12
  Physical breathing effort,Air hunger                                                                                                                                     3
  Physical breathing effort,Air hunger,Breathing a lot/Unplanned breaths                                                                                                   1
  Physical breathing effort,Air hunger,Breathing a lot/Unplanned breaths,Can't finish phrases                                                                              1
  Physical breathing effort,Air hunger,Can't finish phrases                                                                                                                6
  Physical breathing effort,Air hunger,Chest tightness                                                                                                                     1
  Physical breathing effort,Air hunger,Chest tightness,Can't finish phrases                                                                                                2
  Physical breathing effort,Air hunger,Chest tightness,Mental breathing effort                                                                                             1
  Physical breathing effort,Air hunger,Chest tightness,Mental breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases                                      0
  Physical breathing effort,Air hunger,Chest tightness,Mental breathing effort,Can't finish phrases                                                                        0
  Physical breathing effort,Air hunger,Mental breathing effort                                                                                                             0
  Physical breathing effort,Air hunger,Mental breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases                                                      4
  Physical breathing effort,Air hunger,Mental breathing effort,Can't finish phrases                                                                                        1
  Physical breathing effort,Air hunger,Mental breathing effort,Unplanned breaths,Can't finish phrases                                                                      3
  Physical breathing effort,Air hunger,Unplanned breaths                                                                                                                   1
  Physical breathing effort,Air hunger,Unplanned breaths,Can't finish phrases                                                                                              3
  Physical breathing effort,Breathing a lot/Unplanned breaths                                                                                                              1
  Physical breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases                                                                                         3
  Physical breathing effort,Breathing a lot/Unplanned breaths,Other                                                                                                        1
  Physical breathing effort,Can't finish phrases                                                                                                                           6
  Physical breathing effort,Can't finish phrases,Other                                                                                                                     1
  Physical breathing effort,Chest tightness                                                                                                                                0
  Physical breathing effort,Chest tightness,Breathing a lot/Unplanned breaths                                                                                              2
  Physical breathing effort,Chest tightness,Breathing a lot/Unplanned breaths,Can't finish phrases                                                                         1
  Physical breathing effort,Chest tightness,Can't finish phrases                                                                                                           2
  Physical breathing effort,Chest tightness,Mental breathing effort                                                                                                        0
  Physical breathing effort,Chest tightness,Mental breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases                                                 0
  Physical breathing effort,Chest tightness,Mental breathing effort,Can't finish phrases                                                                                   0
  Physical breathing effort,Chest tightness,Unplanned breaths                                                                                                              0
  Physical breathing effort,Chest tightness,Unplanned breaths,Can't finish phrases                                                                                         1
  Physical breathing effort,Mental breathing effort                                                                                                                        4
  Physical breathing effort,Mental breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases                                                                 4
  Physical breathing effort,Mental breathing effort,Can't finish phrases                                                                                                   2
  Physical breathing effort,Mental breathing effort,Other                                                                                                                  0
  Physical breathing effort,Mental breathing effort,Unplanned breaths                                                                                                      2
  Physical breathing effort,Mental breathing effort,Unplanned breaths,Can't finish phrases                                                                                 0
  Physical breathing effort,Other                                                                                                                                          2
  Physical breathing effort,Unplanned breaths,Can't finish phrases                                                                                                         0
  Physical breathing effort,Unplanned breaths,Can't finish phrases,Other                                                                                                   1
  Unplanned breaths                                                                                                                                                        3
  Unplanned breaths,Can't finish phrases                                                                                                                                  12
                                                                                                                                                                         
                                                                                                                                                                           1
  Air hunger                                                                                                                                                              14
  Air hunger,Breathing a lot/Unplanned breaths                                                                                                                             1
  Air hunger,Breathing a lot/Unplanned breaths,Can't finish phrases                                                                                                       17
  Air hunger,Can't finish phrases                                                                                                                                         14
  Air hunger,Can't finish phrases,Other                                                                                                                                    0
  Air hunger,Chest tightness                                                                                                                                               3
  Air hunger,Chest tightness,Breathing a lot/Unplanned breaths                                                                                                             1
  Air hunger,Chest tightness,Breathing a lot/Unplanned breaths,Can't finish phrases                                                                                        2
  Air hunger,Chest tightness,Can't finish phrases                                                                                                                          3
  Air hunger,Chest tightness,Mental breathing effort                                                                                                                       2
  Air hunger,Chest tightness,Mental breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases                                                                0
  Air hunger,Chest tightness,Mental breathing effort,Unplanned breaths                                                                                                     1
  Air hunger,Chest tightness,Unplanned breaths                                                                                                                             1
  Air hunger,Chest tightness,Unplanned breaths,Can't finish phrases                                                                                                        2
  Air hunger,Mental breathing effort                                                                                                                                       3
  Air hunger,Mental breathing effort,Breathing a lot/Unplanned breaths                                                                                                     4
  Air hunger,Mental breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases                                                                                5
  Air hunger,Mental breathing effort,Can't finish phrases                                                                                                                  9
  Air hunger,Mental breathing effort,Unplanned breaths                                                                                                                     0
  Air hunger,Unplanned breaths                                                                                                                                             1
  Air hunger,Unplanned breaths,Can't finish phrases                                                                                                                        5
  Breathing a lot/Unplanned breaths                                                                                                                                        2
  Breathing a lot/Unplanned breaths,Can't finish phrases                                                                                                                  11
  Breathing a lot/Unplanned breaths,Other                                                                                                                                  0
  Breathing discomfort                                                                                                                                                     7
  Breathing discomfort,Air hunger                                                                                                                                          1
  Breathing discomfort,Air hunger,Breathing a lot/Unplanned breaths                                                                                                        0
  Breathing discomfort,Air hunger,Breathing a lot/Unplanned breaths,Can't finish phrases                                                                                   1
  Breathing discomfort,Air hunger,Can't finish phrases                                                                                                                     1
  Breathing discomfort,Air hunger,Chest tightness                                                                                                                          1
  Breathing discomfort,Air hunger,Chest tightness,Breathing a lot/Unplanned breaths                                                                                        0
  Breathing discomfort,Air hunger,Chest tightness,Breathing a lot/Unplanned breaths,Can't finish phrases                                                                   0
  Breathing discomfort,Air hunger,Chest tightness,Can't finish phrases                                                                                                     1
  Breathing discomfort,Air hunger,Chest tightness,Mental breathing effort                                                                                                  2
  Breathing discomfort,Air hunger,Chest tightness,Mental breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases                                           2
  Breathing discomfort,Air hunger,Chest tightness,Mental breathing effort,Can't finish phrases                                                                             1
  Breathing discomfort,Air hunger,Mental breathing effort                                                                                                                  4
  Breathing discomfort,Air hunger,Mental breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases                                                           1
  Breathing discomfort,Air hunger,Mental breathing effort,Can't finish phrases                                                                                             2
  Breathing discomfort,Air hunger,Mental breathing effort,Unplanned breaths,Can't finish phrases                                                                           1
  Breathing discomfort,Air hunger,Other                                                                                                                                    0
  Breathing discomfort,Air hunger,Unplanned breaths                                                                                                                        0
  Breathing discomfort,Breathing a lot/Unplanned breaths                                                                                                                   2
  Breathing discomfort,Breathing a lot/Unplanned breaths,Can't finish phrases                                                                                              2
  Breathing discomfort,Can't finish phrases                                                                                                                                5
  Breathing discomfort,Chest tightness                                                                                                                                     2
  Breathing discomfort,Chest tightness,Breathing a lot/Unplanned breaths                                                                                                   1
  Breathing discomfort,Chest tightness,Can't finish phrases                                                                                                                3
  Breathing discomfort,Chest tightness,Mental breathing effort                                                                                                             1
  Breathing discomfort,Chest tightness,Mental breathing effort,Breathing a lot/Unplanned breaths                                                                           0
  Breathing discomfort,Chest tightness,Unplanned breaths                                                                                                                   2
  Breathing discomfort,Chest tightness,Unplanned breaths,Can't finish phrases                                                                                              1
  Breathing discomfort,Mental breathing effort                                                                                                                             2
  Breathing discomfort,Mental breathing effort,Can't finish phrases                                                                                                        0
  Breathing discomfort,Physical breathing effort                                                                                                                           1
  Breathing discomfort,Physical breathing effort,Air hunger                                                                                                                1
  Breathing discomfort,Physical breathing effort,Air hunger,Breathing a lot/Unplanned breaths,Can't finish phrases                                                         0
  Breathing discomfort,Physical breathing effort,Air hunger,Chest tightness,Mental breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases                 2
  Breathing discomfort,Physical breathing effort,Air hunger,Chest tightness,Mental breathing effort,Can't finish phrases                                                   1
  Breathing discomfort,Physical breathing effort,Air hunger,Chest tightness,Mental breathing effort,Unplanned breaths,Can't finish phrases                                 1
  Breathing discomfort,Physical breathing effort,Air hunger,Mental breathing effort                                                                                        0
  Breathing discomfort,Physical breathing effort,Air hunger,Mental breathing effort,Unplanned breaths                                                                      0
  Breathing discomfort,Physical breathing effort,Air hunger,Mental breathing effort,Unplanned breaths,Can't finish phrases                                                 0
  Breathing discomfort,Physical breathing effort,Breathing a lot/Unplanned breaths                                                                                         1
  Breathing discomfort,Physical breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases                                                                    1
  Breathing discomfort,Physical breathing effort,Can't finish phrases                                                                                                      2
  Breathing discomfort,Physical breathing effort,Chest tightness                                                                                                           1
  Breathing discomfort,Physical breathing effort,Chest tightness,Breathing a lot/Unplanned breaths                                                                         0
  Breathing discomfort,Physical breathing effort,Chest tightness,Breathing a lot/Unplanned breaths,Can't finish phrases                                                    0
  Breathing discomfort,Physical breathing effort,Chest tightness,Can't finish phrases                                                                                      2
  Breathing discomfort,Physical breathing effort,Chest tightness,Mental breathing effort                                                                                   1
  Breathing discomfort,Physical breathing effort,Chest tightness,Mental breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases                            2
  Breathing discomfort,Physical breathing effort,Chest tightness,Mental breathing effort,Unplanned breaths,Can't finish phrases                                            1
  Breathing discomfort,Physical breathing effort,Chest tightness,Unplanned breaths                                                                                         1
  Breathing discomfort,Physical breathing effort,Chest tightness,Unplanned breaths,Can't finish phrases                                                                    1
  Breathing discomfort,Physical breathing effort,Mental breathing effort,Breathing a lot/Unplanned breaths                                                                 0
  Breathing discomfort,Physical breathing effort,Mental breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases                                            0
  Breathing discomfort,Physical breathing effort,Mental breathing effort,Can't finish phrases                                                                              2
  Breathing discomfort,Physical breathing effort,Mental breathing effort,Unplanned breaths,Can't finish phrases                                                            2
  Breathing discomfort,Physical breathing effort,Unplanned breaths                                                                                                         1
  Breathing discomfort,Unplanned breaths                                                                                                                                   1
  Breathing discomfort,Unplanned breaths,Can't finish phrases                                                                                                              0
  Breathlessness                                                                                                                                                          10
  Breathlessness,Air hunger                                                                                                                                                6
  Breathlessness,Air hunger,Breathing a lot/Unplanned breaths                                                                                                              4
  Breathlessness,Air hunger,Breathing a lot/Unplanned breaths,Can't finish phrases                                                                                         9
  Breathlessness,Air hunger,Breathing a lot/Unplanned breaths,Can't finish phrases,Other                                                                                   0
  Breathlessness,Air hunger,Can't finish phrases                                                                                                                           3
  Breathlessness,Air hunger,Can't finish phrases,Other                                                                                                                     0
  Breathlessness,Air hunger,Chest tightness                                                                                                                                0
  Breathlessness,Air hunger,Chest tightness,Breathing a lot/Unplanned breaths                                                                                              1
  Breathlessness,Air hunger,Chest tightness,Breathing a lot/Unplanned breaths,Can't finish phrases                                                                         6
  Breathlessness,Air hunger,Chest tightness,Breathing a lot/Unplanned breaths,Other                                                                                        0
  Breathlessness,Air hunger,Chest tightness,Can't finish phrases                                                                                                           3
  Breathlessness,Air hunger,Chest tightness,Mental breathing effort                                                                                                        1
  Breathlessness,Air hunger,Chest tightness,Mental breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases                                                 0
  Breathlessness,Air hunger,Chest tightness,Mental breathing effort,Can't finish phrases                                                                                   1
  Breathlessness,Air hunger,Chest tightness,Unplanned breaths                                                                                                              1
  Breathlessness,Air hunger,Chest tightness,Unplanned breaths,Can't finish phrases                                                                                         1
  Breathlessness,Air hunger,Mental breathing effort                                                                                                                        0
  Breathlessness,Air hunger,Mental breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases                                                                 5
  Breathlessness,Air hunger,Mental breathing effort,Breathing a lot/Unplanned breaths,Other                                                                                0
  Breathlessness,Air hunger,Mental breathing effort,Can't finish phrases                                                                                                   3
  Breathlessness,Air hunger,Unplanned breaths,Can't finish phrases                                                                                                         3
  Breathlessness,Breathing a lot/Unplanned breaths                                                                                                                         2
  Breathlessness,Breathing a lot/Unplanned breaths,Can't finish phrases                                                                                                    5
  Breathlessness,Breathing a lot/Unplanned breaths,Can't finish phrases,Other                                                                                              1
  Breathlessness,Breathing discomfort                                                                                                                                      3
  Breathlessness,Breathing discomfort,Air hunger,Breathing a lot/Unplanned breaths                                                                                         1
  Breathlessness,Breathing discomfort,Air hunger,Breathing a lot/Unplanned breaths,Can't finish phrases                                                                    1
  Breathlessness,Breathing discomfort,Air hunger,Can't finish phrases                                                                                                      2
  Breathlessness,Breathing discomfort,Air hunger,Chest tightness                                                                                                           3
  Breathlessness,Breathing discomfort,Air hunger,Chest tightness,Breathing a lot/Unplanned breaths                                                                         1
  Breathlessness,Breathing discomfort,Air hunger,Chest tightness,Breathing a lot/Unplanned breaths,Can't finish phrases                                                    7
  Breathlessness,Breathing discomfort,Air hunger,Chest tightness,Can't finish phrases                                                                                      1
  Breathlessness,Breathing discomfort,Air hunger,Chest tightness,Mental breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases                            3
  Breathlessness,Breathing discomfort,Air hunger,Chest tightness,Mental breathing effort,Can't finish phrases                                                              1
  Breathlessness,Breathing discomfort,Air hunger,Chest tightness,Mental breathing effort,Unplanned breaths,Can't finish phrases                                            1
  Breathlessness,Breathing discomfort,Air hunger,Chest tightness,Unplanned breaths,Can't finish phrases                                                                    4
  Breathlessness,Breathing discomfort,Air hunger,Chest tightness,Unplanned breaths,Can't finish phrases,Other                                                              0
  Breathlessness,Breathing discomfort,Air hunger,Mental breathing effort                                                                                                   1
  Breathlessness,Breathing discomfort,Air hunger,Mental breathing effort,Unplanned breaths,Can't finish phrases                                                            4
  Breathlessness,Breathing discomfort,Air hunger,Other                                                                                                                     1
  Breathlessness,Breathing discomfort,Air hunger,Unplanned breaths,Can't finish phrases                                                                                    1
  Breathlessness,Breathing discomfort,Breathing a lot/Unplanned breaths,Can't finish phrases                                                                               0
  Breathlessness,Breathing discomfort,Can't finish phrases                                                                                                                 1
  Breathlessness,Breathing discomfort,Chest tightness                                                                                                                      5
  Breathlessness,Breathing discomfort,Chest tightness,Breathing a lot/Unplanned breaths                                                                                    1
  Breathlessness,Breathing discomfort,Chest tightness,Breathing a lot/Unplanned breaths,Can't finish phrases                                                               0
  Breathlessness,Breathing discomfort,Chest tightness,Can't finish phrases                                                                                                 3
  Breathlessness,Breathing discomfort,Chest tightness,Mental breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases                                       0
  Breathlessness,Breathing discomfort,Chest tightness,Mental breathing effort,Can't finish phrases                                                                         2
  Breathlessness,Breathing discomfort,Chest tightness,Unplanned breaths                                                                                                    1
  Breathlessness,Breathing discomfort,Chest tightness,Unplanned breaths,Can't finish phrases                                                                               2
  Breathlessness,Breathing discomfort,Mental breathing effort,Breathing a lot/Unplanned breaths                                                                            0
  Breathlessness,Breathing discomfort,Mental breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases                                                       1
  Breathlessness,Breathing discomfort,Mental breathing effort,Can't finish phrases                                                                                         0
  Breathlessness,Breathing discomfort,Physical breathing effort                                                                                                            1
  Breathlessness,Breathing discomfort,Physical breathing effort,Air hunger                                                                                                 3
  Breathlessness,Breathing discomfort,Physical breathing effort,Air hunger,Breathing a lot/Unplanned breaths                                                               1
  Breathlessness,Breathing discomfort,Physical breathing effort,Air hunger,Breathing a lot/Unplanned breaths,Can't finish phrases                                          2
  Breathlessness,Breathing discomfort,Physical breathing effort,Air hunger,Breathing a lot/Unplanned breaths,Can't finish phrases,Other                                    0
  Breathlessness,Breathing discomfort,Physical breathing effort,Air hunger,Can't finish phrases                                                                            1
  Breathlessness,Breathing discomfort,Physical breathing effort,Air hunger,Chest tightness                                                                                 0
  Breathlessness,Breathing discomfort,Physical breathing effort,Air hunger,Chest tightness,Breathing a lot/Unplanned breaths                                               1
  Breathlessness,Breathing discomfort,Physical breathing effort,Air hunger,Chest tightness,Breathing a lot/Unplanned breaths,Can't finish phrases                          4
  Breathlessness,Breathing discomfort,Physical breathing effort,Air hunger,Chest tightness,Can't finish phrases                                                            6
  Breathlessness,Breathing discomfort,Physical breathing effort,Air hunger,Chest tightness,Mental breathing effort                                                         2
  Breathlessness,Breathing discomfort,Physical breathing effort,Air hunger,Chest tightness,Mental breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases 28
  Breathlessness,Breathing discomfort,Physical breathing effort,Air hunger,Chest tightness,Mental breathing effort,Can't finish phrases                                    3
  Breathlessness,Breathing discomfort,Physical breathing effort,Air hunger,Chest tightness,Mental breathing effort,Unplanned breaths,Can't finish phrases                 30
  Breathlessness,Breathing discomfort,Physical breathing effort,Air hunger,Chest tightness,Unplanned breaths,Can't finish phrases                                          0
  Breathlessness,Breathing discomfort,Physical breathing effort,Air hunger,Mental breathing effort,Breathing a lot/Unplanned breaths                                       1
  Breathlessness,Breathing discomfort,Physical breathing effort,Air hunger,Mental breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases                  7
  Breathlessness,Breathing discomfort,Physical breathing effort,Air hunger,Mental breathing effort,Can't finish phrases                                                    0
  Breathlessness,Breathing discomfort,Physical breathing effort,Air hunger,Mental breathing effort,Unplanned breaths,Can't finish phrases                                  2
  Breathlessness,Breathing discomfort,Physical breathing effort,Air hunger,Unplanned breaths,Can't finish phrases                                                          0
  Breathlessness,Breathing discomfort,Physical breathing effort,Breathing a lot/Unplanned breaths                                                                          0
  Breathlessness,Breathing discomfort,Physical breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases                                                     2
  Breathlessness,Breathing discomfort,Physical breathing effort,Can't finish phrases                                                                                       0
  Breathlessness,Breathing discomfort,Physical breathing effort,Chest tightness                                                                                            1
  Breathlessness,Breathing discomfort,Physical breathing effort,Chest tightness,Breathing a lot/Unplanned breaths,Can't finish phrases                                     2
  Breathlessness,Breathing discomfort,Physical breathing effort,Chest tightness,Mental breathing effort                                                                    0
  Breathlessness,Breathing discomfort,Physical breathing effort,Chest tightness,Mental breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases             1
  Breathlessness,Breathing discomfort,Physical breathing effort,Chest tightness,Mental breathing effort,Can't finish phrases                                               3
  Breathlessness,Breathing discomfort,Physical breathing effort,Chest tightness,Mental breathing effort,Unplanned breaths,Can't finish phrases                             1
  Breathlessness,Breathing discomfort,Physical breathing effort,Mental breathing effort                                                                                    1
  Breathlessness,Breathing discomfort,Physical breathing effort,Mental breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases                             0
  Breathlessness,Breathing discomfort,Physical breathing effort,Mental breathing effort,Can't finish phrases                                                               1
  Breathlessness,Breathing discomfort,Physical breathing effort,Unplanned breaths                                                                                          2
  Breathlessness,Breathing discomfort,Physical breathing effort,Unplanned breaths,Can't finish phrases                                                                     2
  Breathlessness,Breathing discomfort,Unplanned breaths,Can't finish phrases                                                                                               1
  Breathlessness,Can't finish phrases                                                                                                                                     15
  Breathlessness,Can't finish phrases,Other                                                                                                                                2
  Breathlessness,Chest tightness                                                                                                                                           3
  Breathlessness,Chest tightness,Breathing a lot/Unplanned breaths                                                                                                         0
  Breathlessness,Chest tightness,Breathing a lot/Unplanned breaths,Can't finish phrases                                                                                    0
  Breathlessness,Chest tightness,Can't finish phrases                                                                                                                      4
  Breathlessness,Chest tightness,Mental breathing effort                                                                                                                   0
  Breathlessness,Chest tightness,Unplanned breaths,Can't finish phrases                                                                                                    2
  Breathlessness,Mental breathing effort                                                                                                                                   1
  Breathlessness,Mental breathing effort,Breathing a lot/Unplanned breaths                                                                                                 2
  Breathlessness,Mental breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases                                                                            1
  Breathlessness,Mental breathing effort,Can't finish phrases                                                                                                              1
  Breathlessness,Mental breathing effort,Unplanned breaths                                                                                                                 0
  Breathlessness,Mental breathing effort,Unplanned breaths,Can't finish phrases                                                                                            1
  Breathlessness,Other                                                                                                                                                     1
  Breathlessness,Physical breathing effort                                                                                                                                 0
  Breathlessness,Physical breathing effort,Air hunger                                                                                                                      2
  Breathlessness,Physical breathing effort,Air hunger,Breathing a lot/Unplanned breaths                                                                                    0
  Breathlessness,Physical breathing effort,Air hunger,Breathing a lot/Unplanned breaths,Can't finish phrases                                                               2
  Breathlessness,Physical breathing effort,Air hunger,Can't finish phrases                                                                                                 2
  Breathlessness,Physical breathing effort,Air hunger,Chest tightness                                                                                                      0
  Breathlessness,Physical breathing effort,Air hunger,Chest tightness,Breathing a lot/Unplanned breaths,Can't finish phrases                                               1
  Breathlessness,Physical breathing effort,Air hunger,Chest tightness,Breathing a lot/Unplanned breaths,Can't finish phrases,Other                                         1
  Breathlessness,Physical breathing effort,Air hunger,Chest tightness,Mental breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases                       2
  Breathlessness,Physical breathing effort,Air hunger,Chest tightness,Mental breathing effort,Can't finish phrases                                                         1
  Breathlessness,Physical breathing effort,Air hunger,Chest tightness,Mental breathing effort,Unplanned breaths,Can't finish phrases                                       3
  Breathlessness,Physical breathing effort,Air hunger,Chest tightness,Unplanned breaths                                                                                    0
  Breathlessness,Physical breathing effort,Air hunger,Chest tightness,Unplanned breaths,Can't finish phrases                                                               2
  Breathlessness,Physical breathing effort,Air hunger,Mental breathing effort                                                                                              0
  Breathlessness,Physical breathing effort,Air hunger,Mental breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases                                       3
  Breathlessness,Physical breathing effort,Air hunger,Mental breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases,Other                                 1
  Breathlessness,Physical breathing effort,Air hunger,Mental breathing effort,Can't finish phrases                                                                         1
  Breathlessness,Physical breathing effort,Air hunger,Mental breathing effort,Unplanned breaths,Can't finish phrases                                                       2
  Breathlessness,Physical breathing effort,Air hunger,Mental breathing effort,Unplanned breaths,Can't finish phrases,Other                                                 1
  Breathlessness,Physical breathing effort,Air hunger,Unplanned breaths,Can't finish phrases                                                                               2
  Breathlessness,Physical breathing effort,Breathing a lot/Unplanned breaths                                                                                               1
  Breathlessness,Physical breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases                                                                          4
  Breathlessness,Physical breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases,Other                                                                    1
  Breathlessness,Physical breathing effort,Can't finish phrases                                                                                                            1
  Breathlessness,Physical breathing effort,Chest tightness                                                                                                                 2
  Breathlessness,Physical breathing effort,Chest tightness,Breathing a lot/Unplanned breaths,Can't finish phrases                                                          1
  Breathlessness,Physical breathing effort,Chest tightness,Can't finish phrases                                                                                            1
  Breathlessness,Physical breathing effort,Chest tightness,Mental breathing effort                                                                                         0
  Breathlessness,Physical breathing effort,Chest tightness,Mental breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases                                  1
  Breathlessness,Physical breathing effort,Chest tightness,Unplanned breaths,Can't finish phrases                                                                          0
  Breathlessness,Physical breathing effort,Mental breathing effort,Breathing a lot/Unplanned breaths                                                                       1
  Breathlessness,Physical breathing effort,Mental breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases                                                  4
  Breathlessness,Physical breathing effort,Mental breathing effort,Can't finish phrases                                                                                    3
  Breathlessness,Physical breathing effort,Mental breathing effort,Unplanned breaths                                                                                       0
  Breathlessness,Physical breathing effort,Mental breathing effort,Unplanned breaths,Can't finish phrases                                                                  2
  Breathlessness,Physical breathing effort,Unplanned breaths,Can't finish phrases                                                                                          0
  Breathlessness,Unplanned breaths                                                                                                                                         1
  Breathlessness,Unplanned breaths,Can't finish phrases                                                                                                                    7
  Can't finish phrases                                                                                                                                                    46
  Can't finish phrases,Breathing discomfort                                                                                                                                0
  Can't finish phrases,Mental breathing effort                                                                                                                             0
  Can't finish phrases,Other                                                                                                                                               0
  Can't finish phrases,Unplanned breaths                                                                                                                                   1
  Chest tightness                                                                                                                                                          7
  Chest tightness,Breathing a lot/Unplanned breaths                                                                                                                        2
  Chest tightness,Breathing a lot/Unplanned breaths,Can't finish phrases                                                                                                   0
  Chest tightness,Can't finish phrases                                                                                                                                     3
  Chest tightness,Mental breathing effort                                                                                                                                  0
  Chest tightness,Mental breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases                                                                           0
  Chest tightness,Mental breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases,Other                                                                     1
  Chest tightness,Mental breathing effort,Can't finish phrases                                                                                                             0
  Chest tightness,Other                                                                                                                                                    1
  Chest tightness,Unplanned breaths                                                                                                                                        2
  Mental breathing effort                                                                                                                                                  4
  Mental breathing effort,Breathing a lot/Unplanned breaths                                                                                                                1
  Mental breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases                                                                                           3
  Mental breathing effort,Can't finish phrases                                                                                                                             4
  Mental breathing effort,Can't finish phrases,Other                                                                                                                       2
  Mental breathing effort,Other                                                                                                                                            1
  Mental breathing effort,Unplanned breaths,Can't finish phrases                                                                                                           3
  Misc/Unclear                                                                                                                                                             0
  None of the above                                                                                                                                                        1
  Other                                                                                                                                                                    0
  Physical breathing effort                                                                                                                                               11
  Physical breathing effort,Air hunger                                                                                                                                     6
  Physical breathing effort,Air hunger,Breathing a lot/Unplanned breaths                                                                                                   0
  Physical breathing effort,Air hunger,Breathing a lot/Unplanned breaths,Can't finish phrases                                                                              1
  Physical breathing effort,Air hunger,Can't finish phrases                                                                                                                6
  Physical breathing effort,Air hunger,Chest tightness                                                                                                                     1
  Physical breathing effort,Air hunger,Chest tightness,Can't finish phrases                                                                                                3
  Physical breathing effort,Air hunger,Chest tightness,Mental breathing effort                                                                                             0
  Physical breathing effort,Air hunger,Chest tightness,Mental breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases                                      1
  Physical breathing effort,Air hunger,Chest tightness,Mental breathing effort,Can't finish phrases                                                                        1
  Physical breathing effort,Air hunger,Mental breathing effort                                                                                                             4
  Physical breathing effort,Air hunger,Mental breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases                                                      0
  Physical breathing effort,Air hunger,Mental breathing effort,Can't finish phrases                                                                                        2
  Physical breathing effort,Air hunger,Mental breathing effort,Unplanned breaths,Can't finish phrases                                                                      3
  Physical breathing effort,Air hunger,Unplanned breaths                                                                                                                   0
  Physical breathing effort,Air hunger,Unplanned breaths,Can't finish phrases                                                                                              0
  Physical breathing effort,Breathing a lot/Unplanned breaths                                                                                                              1
  Physical breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases                                                                                         3
  Physical breathing effort,Breathing a lot/Unplanned breaths,Other                                                                                                        0
  Physical breathing effort,Can't finish phrases                                                                                                                           6
  Physical breathing effort,Can't finish phrases,Other                                                                                                                     0
  Physical breathing effort,Chest tightness                                                                                                                                5
  Physical breathing effort,Chest tightness,Breathing a lot/Unplanned breaths                                                                                              0
  Physical breathing effort,Chest tightness,Breathing a lot/Unplanned breaths,Can't finish phrases                                                                         0
  Physical breathing effort,Chest tightness,Can't finish phrases                                                                                                           1
  Physical breathing effort,Chest tightness,Mental breathing effort                                                                                                        1
  Physical breathing effort,Chest tightness,Mental breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases                                                 2
  Physical breathing effort,Chest tightness,Mental breathing effort,Can't finish phrases                                                                                   2
  Physical breathing effort,Chest tightness,Unplanned breaths                                                                                                              1
  Physical breathing effort,Chest tightness,Unplanned breaths,Can't finish phrases                                                                                         0
  Physical breathing effort,Mental breathing effort                                                                                                                        5
  Physical breathing effort,Mental breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases                                                                 2
  Physical breathing effort,Mental breathing effort,Can't finish phrases                                                                                                   6
  Physical breathing effort,Mental breathing effort,Other                                                                                                                  1
  Physical breathing effort,Mental breathing effort,Unplanned breaths                                                                                                      2
  Physical breathing effort,Mental breathing effort,Unplanned breaths,Can't finish phrases                                                                                 1
  Physical breathing effort,Other                                                                                                                                          2
  Physical breathing effort,Unplanned breaths,Can't finish phrases                                                                                                         2
  Physical breathing effort,Unplanned breaths,Can't finish phrases,Other                                                                                                   0
  Unplanned breaths                                                                                                                                                        3
  Unplanned breaths,Can't finish phrases                                                                                                                                  13

Contingency Table (Row Percentages):
                                                                                                                                                                         
                                                                                                                                                                               0
  Air hunger                                                                                                                                                               54.84
  Air hunger,Breathing a lot/Unplanned breaths                                                                                                                             83.33
  Air hunger,Breathing a lot/Unplanned breaths,Can't finish phrases                                                                                                        41.38
  Air hunger,Can't finish phrases                                                                                                                                          58.82
  Air hunger,Can't finish phrases,Other                                                                                                                                   100.00
  Air hunger,Chest tightness                                                                                                                                               50.00
  Air hunger,Chest tightness,Breathing a lot/Unplanned breaths                                                                                                              0.00
  Air hunger,Chest tightness,Breathing a lot/Unplanned breaths,Can't finish phrases                                                                                        33.33
  Air hunger,Chest tightness,Can't finish phrases                                                                                                                          57.14
  Air hunger,Chest tightness,Mental breathing effort                                                                                                                        0.00
  Air hunger,Chest tightness,Mental breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases                                                               100.00
  Air hunger,Chest tightness,Mental breathing effort,Unplanned breaths                                                                                                      0.00
  Air hunger,Chest tightness,Unplanned breaths                                                                                                                              0.00
  Air hunger,Chest tightness,Unplanned breaths,Can't finish phrases                                                                                                         0.00
  Air hunger,Mental breathing effort                                                                                                                                       66.67
  Air hunger,Mental breathing effort,Breathing a lot/Unplanned breaths                                                                                                      0.00
  Air hunger,Mental breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases                                                                                50.00
  Air hunger,Mental breathing effort,Can't finish phrases                                                                                                                  18.18
  Air hunger,Mental breathing effort,Unplanned breaths                                                                                                                    100.00
  Air hunger,Unplanned breaths                                                                                                                                             66.67
  Air hunger,Unplanned breaths,Can't finish phrases                                                                                                                        44.44
  Breathing a lot/Unplanned breaths                                                                                                                                        81.82
  Breathing a lot/Unplanned breaths,Can't finish phrases                                                                                                                   73.81
  Breathing a lot/Unplanned breaths,Other                                                                                                                                 100.00
  Breathing discomfort                                                                                                                                                     63.16
  Breathing discomfort,Air hunger                                                                                                                                          66.67
  Breathing discomfort,Air hunger,Breathing a lot/Unplanned breaths                                                                                                       100.00
  Breathing discomfort,Air hunger,Breathing a lot/Unplanned breaths,Can't finish phrases                                                                                   50.00
  Breathing discomfort,Air hunger,Can't finish phrases                                                                                                                     80.00
  Breathing discomfort,Air hunger,Chest tightness                                                                                                                          50.00
  Breathing discomfort,Air hunger,Chest tightness,Breathing a lot/Unplanned breaths                                                                                       100.00
  Breathing discomfort,Air hunger,Chest tightness,Breathing a lot/Unplanned breaths,Can't finish phrases                                                                  100.00
  Breathing discomfort,Air hunger,Chest tightness,Can't finish phrases                                                                                                     50.00
  Breathing discomfort,Air hunger,Chest tightness,Mental breathing effort                                                                                                   0.00
  Breathing discomfort,Air hunger,Chest tightness,Mental breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases                                            0.00
  Breathing discomfort,Air hunger,Chest tightness,Mental breathing effort,Can't finish phrases                                                                              0.00
  Breathing discomfort,Air hunger,Mental breathing effort                                                                                                                   0.00
  Breathing discomfort,Air hunger,Mental breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases                                                            0.00
  Breathing discomfort,Air hunger,Mental breathing effort,Can't finish phrases                                                                                              0.00
  Breathing discomfort,Air hunger,Mental breathing effort,Unplanned breaths,Can't finish phrases                                                                            0.00
  Breathing discomfort,Air hunger,Other                                                                                                                                   100.00
  Breathing discomfort,Air hunger,Unplanned breaths                                                                                                                       100.00
  Breathing discomfort,Breathing a lot/Unplanned breaths                                                                                                                   33.33
  Breathing discomfort,Breathing a lot/Unplanned breaths,Can't finish phrases                                                                                              60.00
  Breathing discomfort,Can't finish phrases                                                                                                                                50.00
  Breathing discomfort,Chest tightness                                                                                                                                     80.00
  Breathing discomfort,Chest tightness,Breathing a lot/Unplanned breaths                                                                                                    0.00
  Breathing discomfort,Chest tightness,Can't finish phrases                                                                                                                40.00
  Breathing discomfort,Chest tightness,Mental breathing effort                                                                                                             75.00
  Breathing discomfort,Chest tightness,Mental breathing effort,Breathing a lot/Unplanned breaths                                                                          100.00
  Breathing discomfort,Chest tightness,Unplanned breaths                                                                                                                   33.33
  Breathing discomfort,Chest tightness,Unplanned breaths,Can't finish phrases                                                                                              50.00
  Breathing discomfort,Mental breathing effort                                                                                                                              0.00
  Breathing discomfort,Mental breathing effort,Can't finish phrases                                                                                                       100.00
  Breathing discomfort,Physical breathing effort                                                                                                                           75.00
  Breathing discomfort,Physical breathing effort,Air hunger                                                                                                                 0.00
  Breathing discomfort,Physical breathing effort,Air hunger,Breathing a lot/Unplanned breaths,Can't finish phrases                                                        100.00
  Breathing discomfort,Physical breathing effort,Air hunger,Chest tightness,Mental breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases                  0.00
  Breathing discomfort,Physical breathing effort,Air hunger,Chest tightness,Mental breathing effort,Can't finish phrases                                                    0.00
  Breathing discomfort,Physical breathing effort,Air hunger,Chest tightness,Mental breathing effort,Unplanned breaths,Can't finish phrases                                 50.00
  Breathing discomfort,Physical breathing effort,Air hunger,Mental breathing effort                                                                                       100.00
  Breathing discomfort,Physical breathing effort,Air hunger,Mental breathing effort,Unplanned breaths                                                                     100.00
  Breathing discomfort,Physical breathing effort,Air hunger,Mental breathing effort,Unplanned breaths,Can't finish phrases                                                100.00
  Breathing discomfort,Physical breathing effort,Breathing a lot/Unplanned breaths                                                                                          0.00
  Breathing discomfort,Physical breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases                                                                    50.00
  Breathing discomfort,Physical breathing effort,Can't finish phrases                                                                                                      33.33
  Breathing discomfort,Physical breathing effort,Chest tightness                                                                                                           66.67
  Breathing discomfort,Physical breathing effort,Chest tightness,Breathing a lot/Unplanned breaths                                                                        100.00
  Breathing discomfort,Physical breathing effort,Chest tightness,Breathing a lot/Unplanned breaths,Can't finish phrases                                                   100.00
  Breathing discomfort,Physical breathing effort,Chest tightness,Can't finish phrases                                                                                       0.00
  Breathing discomfort,Physical breathing effort,Chest tightness,Mental breathing effort                                                                                    0.00
  Breathing discomfort,Physical breathing effort,Chest tightness,Mental breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases                             0.00
  Breathing discomfort,Physical breathing effort,Chest tightness,Mental breathing effort,Unplanned breaths,Can't finish phrases                                             0.00
  Breathing discomfort,Physical breathing effort,Chest tightness,Unplanned breaths                                                                                         50.00
  Breathing discomfort,Physical breathing effort,Chest tightness,Unplanned breaths,Can't finish phrases                                                                     0.00
  Breathing discomfort,Physical breathing effort,Mental breathing effort,Breathing a lot/Unplanned breaths                                                                100.00
  Breathing discomfort,Physical breathing effort,Mental breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases                                           100.00
  Breathing discomfort,Physical breathing effort,Mental breathing effort,Can't finish phrases                                                                              33.33
  Breathing discomfort,Physical breathing effort,Mental breathing effort,Unplanned breaths,Can't finish phrases                                                             0.00
  Breathing discomfort,Physical breathing effort,Unplanned breaths                                                                                                          0.00
  Breathing discomfort,Unplanned breaths                                                                                                                                   50.00
  Breathing discomfort,Unplanned breaths,Can't finish phrases                                                                                                             100.00
  Breathlessness                                                                                                                                                           61.54
  Breathlessness,Air hunger                                                                                                                                                45.45
  Breathlessness,Air hunger,Breathing a lot/Unplanned breaths                                                                                                              20.00
  Breathlessness,Air hunger,Breathing a lot/Unplanned breaths,Can't finish phrases                                                                                         71.88
  Breathlessness,Air hunger,Breathing a lot/Unplanned breaths,Can't finish phrases,Other                                                                                  100.00
  Breathlessness,Air hunger,Can't finish phrases                                                                                                                           81.25
  Breathlessness,Air hunger,Can't finish phrases,Other                                                                                                                    100.00
  Breathlessness,Air hunger,Chest tightness                                                                                                                               100.00
  Breathlessness,Air hunger,Chest tightness,Breathing a lot/Unplanned breaths                                                                                              50.00
  Breathlessness,Air hunger,Chest tightness,Breathing a lot/Unplanned breaths,Can't finish phrases                                                                         40.00
  Breathlessness,Air hunger,Chest tightness,Breathing a lot/Unplanned breaths,Other                                                                                       100.00
  Breathlessness,Air hunger,Chest tightness,Can't finish phrases                                                                                                           25.00
  Breathlessness,Air hunger,Chest tightness,Mental breathing effort                                                                                                        66.67
  Breathlessness,Air hunger,Chest tightness,Mental breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases                                                100.00
  Breathlessness,Air hunger,Chest tightness,Mental breathing effort,Can't finish phrases                                                                                   50.00
  Breathlessness,Air hunger,Chest tightness,Unplanned breaths                                                                                                               0.00
  Breathlessness,Air hunger,Chest tightness,Unplanned breaths,Can't finish phrases                                                                                         66.67
  Breathlessness,Air hunger,Mental breathing effort                                                                                                                       100.00
  Breathlessness,Air hunger,Mental breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases                                                                 50.00
  Breathlessness,Air hunger,Mental breathing effort,Breathing a lot/Unplanned breaths,Other                                                                               100.00
  Breathlessness,Air hunger,Mental breathing effort,Can't finish phrases                                                                                                   40.00
  Breathlessness,Air hunger,Unplanned breaths,Can't finish phrases                                                                                                         57.14
  Breathlessness,Breathing a lot/Unplanned breaths                                                                                                                         66.67
  Breathlessness,Breathing a lot/Unplanned breaths,Can't finish phrases                                                                                                    68.75
  Breathlessness,Breathing a lot/Unplanned breaths,Can't finish phrases,Other                                                                                              50.00
  Breathlessness,Breathing discomfort                                                                                                                                      62.50
  Breathlessness,Breathing discomfort,Air hunger,Breathing a lot/Unplanned breaths                                                                                         50.00
  Breathlessness,Breathing discomfort,Air hunger,Breathing a lot/Unplanned breaths,Can't finish phrases                                                                    85.71
  Breathlessness,Breathing discomfort,Air hunger,Can't finish phrases                                                                                                      33.33
  Breathlessness,Breathing discomfort,Air hunger,Chest tightness                                                                                                           40.00
  Breathlessness,Breathing discomfort,Air hunger,Chest tightness,Breathing a lot/Unplanned breaths                                                                         50.00
  Breathlessness,Breathing discomfort,Air hunger,Chest tightness,Breathing a lot/Unplanned breaths,Can't finish phrases                                                    36.36
  Breathlessness,Breathing discomfort,Air hunger,Chest tightness,Can't finish phrases                                                                                      50.00
  Breathlessness,Breathing discomfort,Air hunger,Chest tightness,Mental breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases                             0.00
  Breathlessness,Breathing discomfort,Air hunger,Chest tightness,Mental breathing effort,Can't finish phrases                                                               0.00
  Breathlessness,Breathing discomfort,Air hunger,Chest tightness,Mental breathing effort,Unplanned breaths,Can't finish phrases                                             0.00
  Breathlessness,Breathing discomfort,Air hunger,Chest tightness,Unplanned breaths,Can't finish phrases                                                                     0.00
  Breathlessness,Breathing discomfort,Air hunger,Chest tightness,Unplanned breaths,Can't finish phrases,Other                                                             100.00
  Breathlessness,Breathing discomfort,Air hunger,Mental breathing effort                                                                                                    0.00
  Breathlessness,Breathing discomfort,Air hunger,Mental breathing effort,Unplanned breaths,Can't finish phrases                                                             0.00
  Breathlessness,Breathing discomfort,Air hunger,Other                                                                                                                      0.00
  Breathlessness,Breathing discomfort,Air hunger,Unplanned breaths,Can't finish phrases                                                                                     0.00
  Breathlessness,Breathing discomfort,Breathing a lot/Unplanned breaths,Can't finish phrases                                                                              100.00
  Breathlessness,Breathing discomfort,Can't finish phrases                                                                                                                 87.50
  Breathlessness,Breathing discomfort,Chest tightness                                                                                                                      28.57
  Breathlessness,Breathing discomfort,Chest tightness,Breathing a lot/Unplanned breaths                                                                                     0.00
  Breathlessness,Breathing discomfort,Chest tightness,Breathing a lot/Unplanned breaths,Can't finish phrases                                                              100.00
  Breathlessness,Breathing discomfort,Chest tightness,Can't finish phrases                                                                                                 40.00
  Breathlessness,Breathing discomfort,Chest tightness,Mental breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases                                      100.00
  Breathlessness,Breathing discomfort,Chest tightness,Mental breathing effort,Can't finish phrases                                                                          0.00
  Breathlessness,Breathing discomfort,Chest tightness,Unplanned breaths                                                                                                     0.00
  Breathlessness,Breathing discomfort,Chest tightness,Unplanned breaths,Can't finish phrases                                                                                0.00
  Breathlessness,Breathing discomfort,Mental breathing effort,Breathing a lot/Unplanned breaths                                                                           100.00
  Breathlessness,Breathing discomfort,Mental breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases                                                        0.00
  Breathlessness,Breathing discomfort,Mental breathing effort,Can't finish phrases                                                                                        100.00
  Breathlessness,Breathing discomfort,Physical breathing effort                                                                                                             0.00
  Breathlessness,Breathing discomfort,Physical breathing effort,Air hunger                                                                                                 25.00
  Breathlessness,Breathing discomfort,Physical breathing effort,Air hunger,Breathing a lot/Unplanned breaths                                                               50.00
  Breathlessness,Breathing discomfort,Physical breathing effort,Air hunger,Breathing a lot/Unplanned breaths,Can't finish phrases                                          71.43
  Breathlessness,Breathing discomfort,Physical breathing effort,Air hunger,Breathing a lot/Unplanned breaths,Can't finish phrases,Other                                   100.00
  Breathlessness,Breathing discomfort,Physical breathing effort,Air hunger,Can't finish phrases                                                                            50.00
  Breathlessness,Breathing discomfort,Physical breathing effort,Air hunger,Chest tightness                                                                                100.00
  Breathlessness,Breathing discomfort,Physical breathing effort,Air hunger,Chest tightness,Breathing a lot/Unplanned breaths                                                0.00
  Breathlessness,Breathing discomfort,Physical breathing effort,Air hunger,Chest tightness,Breathing a lot/Unplanned breaths,Can't finish phrases                          20.00
  Breathlessness,Breathing discomfort,Physical breathing effort,Air hunger,Chest tightness,Can't finish phrases                                                            14.29
  Breathlessness,Breathing discomfort,Physical breathing effort,Air hunger,Chest tightness,Mental breathing effort                                                         33.33
  Breathlessness,Breathing discomfort,Physical breathing effort,Air hunger,Chest tightness,Mental breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases  22.22
  Breathlessness,Breathing discomfort,Physical breathing effort,Air hunger,Chest tightness,Mental breathing effort,Can't finish phrases                                     0.00
  Breathlessness,Breathing discomfort,Physical breathing effort,Air hunger,Chest tightness,Mental breathing effort,Unplanned breaths,Can't finish phrases                  14.29
  Breathlessness,Breathing discomfort,Physical breathing effort,Air hunger,Chest tightness,Unplanned breaths,Can't finish phrases                                         100.00
  Breathlessness,Breathing discomfort,Physical breathing effort,Air hunger,Mental breathing effort,Breathing a lot/Unplanned breaths                                        0.00
  Breathlessness,Breathing discomfort,Physical breathing effort,Air hunger,Mental breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases                  41.67
  Breathlessness,Breathing discomfort,Physical breathing effort,Air hunger,Mental breathing effort,Can't finish phrases                                                   100.00
  Breathlessness,Breathing discomfort,Physical breathing effort,Air hunger,Mental breathing effort,Unplanned breaths,Can't finish phrases                                  60.00
  Breathlessness,Breathing discomfort,Physical breathing effort,Air hunger,Unplanned breaths,Can't finish phrases                                                         100.00
  Breathlessness,Breathing discomfort,Physical breathing effort,Breathing a lot/Unplanned breaths                                                                         100.00
  Breathlessness,Breathing discomfort,Physical breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases                                                     66.67
  Breathlessness,Breathing discomfort,Physical breathing effort,Can't finish phrases                                                                                      100.00
  Breathlessness,Breathing discomfort,Physical breathing effort,Chest tightness                                                                                             0.00
  Breathlessness,Breathing discomfort,Physical breathing effort,Chest tightness,Breathing a lot/Unplanned breaths,Can't finish phrases                                     33.33
  Breathlessness,Breathing discomfort,Physical breathing effort,Chest tightness,Mental breathing effort                                                                   100.00
  Breathlessness,Breathing discomfort,Physical breathing effort,Chest tightness,Mental breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases              0.00
  Breathlessness,Breathing discomfort,Physical breathing effort,Chest tightness,Mental breathing effort,Can't finish phrases                                                0.00
  Breathlessness,Breathing discomfort,Physical breathing effort,Chest tightness,Mental breathing effort,Unplanned breaths,Can't finish phrases                             50.00
  Breathlessness,Breathing discomfort,Physical breathing effort,Mental breathing effort                                                                                     0.00
  Breathlessness,Breathing discomfort,Physical breathing effort,Mental breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases                            100.00
  Breathlessness,Breathing discomfort,Physical breathing effort,Mental breathing effort,Can't finish phrases                                                                0.00
  Breathlessness,Breathing discomfort,Physical breathing effort,Unplanned breaths                                                                                           0.00
  Breathlessness,Breathing discomfort,Physical breathing effort,Unplanned breaths,Can't finish phrases                                                                      0.00
  Breathlessness,Breathing discomfort,Unplanned breaths,Can't finish phrases                                                                                               50.00
  Breathlessness,Can't finish phrases                                                                                                                                      50.00
  Breathlessness,Can't finish phrases,Other                                                                                                                                 0.00
  Breathlessness,Chest tightness                                                                                                                                           50.00
  Breathlessness,Chest tightness,Breathing a lot/Unplanned breaths                                                                                                        100.00
  Breathlessness,Chest tightness,Breathing a lot/Unplanned breaths,Can't finish phrases                                                                                   100.00
  Breathlessness,Chest tightness,Can't finish phrases                                                                                                                      69.23
  Breathlessness,Chest tightness,Mental breathing effort                                                                                                                  100.00
  Breathlessness,Chest tightness,Unplanned breaths,Can't finish phrases                                                                                                    33.33
  Breathlessness,Mental breathing effort                                                                                                                                    0.00
  Breathlessness,Mental breathing effort,Breathing a lot/Unplanned breaths                                                                                                  0.00
  Breathlessness,Mental breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases                                                                             0.00
  Breathlessness,Mental breathing effort,Can't finish phrases                                                                                                              83.33
  Breathlessness,Mental breathing effort,Unplanned breaths                                                                                                                100.00
  Breathlessness,Mental breathing effort,Unplanned breaths,Can't finish phrases                                                                                             0.00
  Breathlessness,Other                                                                                                                                                      0.00
  Breathlessness,Physical breathing effort                                                                                                                                100.00
  Breathlessness,Physical breathing effort,Air hunger                                                                                                                       0.00
  Breathlessness,Physical breathing effort,Air hunger,Breathing a lot/Unplanned breaths                                                                                   100.00
  Breathlessness,Physical breathing effort,Air hunger,Breathing a lot/Unplanned breaths,Can't finish phrases                                                               75.00
  Breathlessness,Physical breathing effort,Air hunger,Can't finish phrases                                                                                                 66.67
  Breathlessness,Physical breathing effort,Air hunger,Chest tightness                                                                                                     100.00
  Breathlessness,Physical breathing effort,Air hunger,Chest tightness,Breathing a lot/Unplanned breaths,Can't finish phrases                                               85.71
  Breathlessness,Physical breathing effort,Air hunger,Chest tightness,Breathing a lot/Unplanned breaths,Can't finish phrases,Other                                          0.00
  Breathlessness,Physical breathing effort,Air hunger,Chest tightness,Mental breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases                       66.67
  Breathlessness,Physical breathing effort,Air hunger,Chest tightness,Mental breathing effort,Can't finish phrases                                                          0.00
  Breathlessness,Physical breathing effort,Air hunger,Chest tightness,Mental breathing effort,Unplanned breaths,Can't finish phrases                                        0.00
  Breathlessness,Physical breathing effort,Air hunger,Chest tightness,Unplanned breaths                                                                                   100.00
  Breathlessness,Physical breathing effort,Air hunger,Chest tightness,Unplanned breaths,Can't finish phrases                                                               33.33
  Breathlessness,Physical breathing effort,Air hunger,Mental breathing effort                                                                                             100.00
  Breathlessness,Physical breathing effort,Air hunger,Mental breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases                                       25.00
  Breathlessness,Physical breathing effort,Air hunger,Mental breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases,Other                                  0.00
  Breathlessness,Physical breathing effort,Air hunger,Mental breathing effort,Can't finish phrases                                                                         75.00
  Breathlessness,Physical breathing effort,Air hunger,Mental breathing effort,Unplanned breaths,Can't finish phrases                                                       33.33
  Breathlessness,Physical breathing effort,Air hunger,Mental breathing effort,Unplanned breaths,Can't finish phrases,Other                                                  0.00
  Breathlessness,Physical breathing effort,Air hunger,Unplanned breaths,Can't finish phrases                                                                               50.00
  Breathlessness,Physical breathing effort,Breathing a lot/Unplanned breaths                                                                                                0.00
  Breathlessness,Physical breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases                                                                          50.00
  Breathlessness,Physical breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases,Other                                                                    50.00
  Breathlessness,Physical breathing effort,Can't finish phrases                                                                                                            83.33
  Breathlessness,Physical breathing effort,Chest tightness                                                                                                                 50.00
  Breathlessness,Physical breathing effort,Chest tightness,Breathing a lot/Unplanned breaths,Can't finish phrases                                                          50.00
  Breathlessness,Physical breathing effort,Chest tightness,Can't finish phrases                                                                                            50.00
  Breathlessness,Physical breathing effort,Chest tightness,Mental breathing effort                                                                                        100.00
  Breathlessness,Physical breathing effort,Chest tightness,Mental breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases                                  50.00
  Breathlessness,Physical breathing effort,Chest tightness,Unplanned breaths,Can't finish phrases                                                                         100.00
  Breathlessness,Physical breathing effort,Mental breathing effort,Breathing a lot/Unplanned breaths                                                                       50.00
  Breathlessness,Physical breathing effort,Mental breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases                                                  20.00
  Breathlessness,Physical breathing effort,Mental breathing effort,Can't finish phrases                                                                                    25.00
  Breathlessness,Physical breathing effort,Mental breathing effort,Unplanned breaths                                                                                      100.00
  Breathlessness,Physical breathing effort,Mental breathing effort,Unplanned breaths,Can't finish phrases                                                                   0.00
  Breathlessness,Physical breathing effort,Unplanned breaths,Can't finish phrases                                                                                         100.00
  Breathlessness,Unplanned breaths                                                                                                                                          0.00
  Breathlessness,Unplanned breaths,Can't finish phrases                                                                                                                    36.36
  Can't finish phrases                                                                                                                                                     58.18
  Can't finish phrases,Breathing discomfort                                                                                                                               100.00
  Can't finish phrases,Mental breathing effort                                                                                                                            100.00
  Can't finish phrases,Other                                                                                                                                              100.00
  Can't finish phrases,Unplanned breaths                                                                                                                                    0.00
  Chest tightness                                                                                                                                                          66.67
  Chest tightness,Breathing a lot/Unplanned breaths                                                                                                                         0.00
  Chest tightness,Breathing a lot/Unplanned breaths,Can't finish phrases                                                                                                  100.00
  Chest tightness,Can't finish phrases                                                                                                                                     50.00
  Chest tightness,Mental breathing effort                                                                                                                                 100.00
  Chest tightness,Mental breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases                                                                          100.00
  Chest tightness,Mental breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases,Other                                                                      0.00
  Chest tightness,Mental breathing effort,Can't finish phrases                                                                                                            100.00
  Chest tightness,Other                                                                                                                                                     0.00
  Chest tightness,Unplanned breaths                                                                                                                                        33.33
  Mental breathing effort                                                                                                                                                  76.47
  Mental breathing effort,Breathing a lot/Unplanned breaths                                                                                                                50.00
  Mental breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases                                                                                           50.00
  Mental breathing effort,Can't finish phrases                                                                                                                             71.43
  Mental breathing effort,Can't finish phrases,Other                                                                                                                        0.00
  Mental breathing effort,Other                                                                                                                                             0.00
  Mental breathing effort,Unplanned breaths,Can't finish phrases                                                                                                           25.00
  Misc/Unclear                                                                                                                                                            100.00
  None of the above                                                                                                                                                         0.00
  Other                                                                                                                                                                   100.00
  Physical breathing effort                                                                                                                                                52.17
  Physical breathing effort,Air hunger                                                                                                                                     33.33
  Physical breathing effort,Air hunger,Breathing a lot/Unplanned breaths                                                                                                  100.00
  Physical breathing effort,Air hunger,Breathing a lot/Unplanned breaths,Can't finish phrases                                                                              50.00
  Physical breathing effort,Air hunger,Can't finish phrases                                                                                                                50.00
  Physical breathing effort,Air hunger,Chest tightness                                                                                                                     50.00
  Physical breathing effort,Air hunger,Chest tightness,Can't finish phrases                                                                                                40.00
  Physical breathing effort,Air hunger,Chest tightness,Mental breathing effort                                                                                            100.00
  Physical breathing effort,Air hunger,Chest tightness,Mental breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases                                       0.00
  Physical breathing effort,Air hunger,Chest tightness,Mental breathing effort,Can't finish phrases                                                                         0.00
  Physical breathing effort,Air hunger,Mental breathing effort                                                                                                              0.00
  Physical breathing effort,Air hunger,Mental breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases                                                     100.00
  Physical breathing effort,Air hunger,Mental breathing effort,Can't finish phrases                                                                                        33.33
  Physical breathing effort,Air hunger,Mental breathing effort,Unplanned breaths,Can't finish phrases                                                                      50.00
  Physical breathing effort,Air hunger,Unplanned breaths                                                                                                                  100.00
  Physical breathing effort,Air hunger,Unplanned breaths,Can't finish phrases                                                                                             100.00
  Physical breathing effort,Breathing a lot/Unplanned breaths                                                                                                              50.00
  Physical breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases                                                                                         50.00
  Physical breathing effort,Breathing a lot/Unplanned breaths,Other                                                                                                       100.00
  Physical breathing effort,Can't finish phrases                                                                                                                           50.00
  Physical breathing effort,Can't finish phrases,Other                                                                                                                    100.00
  Physical breathing effort,Chest tightness                                                                                                                                 0.00
  Physical breathing effort,Chest tightness,Breathing a lot/Unplanned breaths                                                                                             100.00
  Physical breathing effort,Chest tightness,Breathing a lot/Unplanned breaths,Can't finish phrases                                                                        100.00
  Physical breathing effort,Chest tightness,Can't finish phrases                                                                                                           66.67
  Physical breathing effort,Chest tightness,Mental breathing effort                                                                                                         0.00
  Physical breathing effort,Chest tightness,Mental breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases                                                  0.00
  Physical breathing effort,Chest tightness,Mental breathing effort,Can't finish phrases                                                                                    0.00
  Physical breathing effort,Chest tightness,Unplanned breaths                                                                                                               0.00
  Physical breathing effort,Chest tightness,Unplanned breaths,Can't finish phrases                                                                                        100.00
  Physical breathing effort,Mental breathing effort                                                                                                                        44.44
  Physical breathing effort,Mental breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases                                                                 66.67
  Physical breathing effort,Mental breathing effort,Can't finish phrases                                                                                                   25.00
  Physical breathing effort,Mental breathing effort,Other                                                                                                                   0.00
  Physical breathing effort,Mental breathing effort,Unplanned breaths                                                                                                      50.00
  Physical breathing effort,Mental breathing effort,Unplanned breaths,Can't finish phrases                                                                                  0.00
  Physical breathing effort,Other                                                                                                                                          50.00
  Physical breathing effort,Unplanned breaths,Can't finish phrases                                                                                                          0.00
  Physical breathing effort,Unplanned breaths,Can't finish phrases,Other                                                                                                  100.00
  Unplanned breaths                                                                                                                                                        50.00
  Unplanned breaths,Can't finish phrases                                                                                                                                   48.00
                                                                                                                                                                         
                                                                                                                                                                               1
  Air hunger                                                                                                                                                               45.16
  Air hunger,Breathing a lot/Unplanned breaths                                                                                                                             16.67
  Air hunger,Breathing a lot/Unplanned breaths,Can't finish phrases                                                                                                        58.62
  Air hunger,Can't finish phrases                                                                                                                                          41.18
  Air hunger,Can't finish phrases,Other                                                                                                                                     0.00
  Air hunger,Chest tightness                                                                                                                                               50.00
  Air hunger,Chest tightness,Breathing a lot/Unplanned breaths                                                                                                            100.00
  Air hunger,Chest tightness,Breathing a lot/Unplanned breaths,Can't finish phrases                                                                                        66.67
  Air hunger,Chest tightness,Can't finish phrases                                                                                                                          42.86
  Air hunger,Chest tightness,Mental breathing effort                                                                                                                      100.00
  Air hunger,Chest tightness,Mental breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases                                                                 0.00
  Air hunger,Chest tightness,Mental breathing effort,Unplanned breaths                                                                                                    100.00
  Air hunger,Chest tightness,Unplanned breaths                                                                                                                            100.00
  Air hunger,Chest tightness,Unplanned breaths,Can't finish phrases                                                                                                       100.00
  Air hunger,Mental breathing effort                                                                                                                                       33.33
  Air hunger,Mental breathing effort,Breathing a lot/Unplanned breaths                                                                                                    100.00
  Air hunger,Mental breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases                                                                                50.00
  Air hunger,Mental breathing effort,Can't finish phrases                                                                                                                  81.82
  Air hunger,Mental breathing effort,Unplanned breaths                                                                                                                      0.00
  Air hunger,Unplanned breaths                                                                                                                                             33.33
  Air hunger,Unplanned breaths,Can't finish phrases                                                                                                                        55.56
  Breathing a lot/Unplanned breaths                                                                                                                                        18.18
  Breathing a lot/Unplanned breaths,Can't finish phrases                                                                                                                   26.19
  Breathing a lot/Unplanned breaths,Other                                                                                                                                   0.00
  Breathing discomfort                                                                                                                                                     36.84
  Breathing discomfort,Air hunger                                                                                                                                          33.33
  Breathing discomfort,Air hunger,Breathing a lot/Unplanned breaths                                                                                                         0.00
  Breathing discomfort,Air hunger,Breathing a lot/Unplanned breaths,Can't finish phrases                                                                                   50.00
  Breathing discomfort,Air hunger,Can't finish phrases                                                                                                                     20.00
  Breathing discomfort,Air hunger,Chest tightness                                                                                                                          50.00
  Breathing discomfort,Air hunger,Chest tightness,Breathing a lot/Unplanned breaths                                                                                         0.00
  Breathing discomfort,Air hunger,Chest tightness,Breathing a lot/Unplanned breaths,Can't finish phrases                                                                    0.00
  Breathing discomfort,Air hunger,Chest tightness,Can't finish phrases                                                                                                     50.00
  Breathing discomfort,Air hunger,Chest tightness,Mental breathing effort                                                                                                 100.00
  Breathing discomfort,Air hunger,Chest tightness,Mental breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases                                          100.00
  Breathing discomfort,Air hunger,Chest tightness,Mental breathing effort,Can't finish phrases                                                                            100.00
  Breathing discomfort,Air hunger,Mental breathing effort                                                                                                                 100.00
  Breathing discomfort,Air hunger,Mental breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases                                                          100.00
  Breathing discomfort,Air hunger,Mental breathing effort,Can't finish phrases                                                                                            100.00
  Breathing discomfort,Air hunger,Mental breathing effort,Unplanned breaths,Can't finish phrases                                                                          100.00
  Breathing discomfort,Air hunger,Other                                                                                                                                     0.00
  Breathing discomfort,Air hunger,Unplanned breaths                                                                                                                         0.00
  Breathing discomfort,Breathing a lot/Unplanned breaths                                                                                                                   66.67
  Breathing discomfort,Breathing a lot/Unplanned breaths,Can't finish phrases                                                                                              40.00
  Breathing discomfort,Can't finish phrases                                                                                                                                50.00
  Breathing discomfort,Chest tightness                                                                                                                                     20.00
  Breathing discomfort,Chest tightness,Breathing a lot/Unplanned breaths                                                                                                  100.00
  Breathing discomfort,Chest tightness,Can't finish phrases                                                                                                                60.00
  Breathing discomfort,Chest tightness,Mental breathing effort                                                                                                             25.00
  Breathing discomfort,Chest tightness,Mental breathing effort,Breathing a lot/Unplanned breaths                                                                            0.00
  Breathing discomfort,Chest tightness,Unplanned breaths                                                                                                                   66.67
  Breathing discomfort,Chest tightness,Unplanned breaths,Can't finish phrases                                                                                              50.00
  Breathing discomfort,Mental breathing effort                                                                                                                            100.00
  Breathing discomfort,Mental breathing effort,Can't finish phrases                                                                                                         0.00
  Breathing discomfort,Physical breathing effort                                                                                                                           25.00
  Breathing discomfort,Physical breathing effort,Air hunger                                                                                                               100.00
  Breathing discomfort,Physical breathing effort,Air hunger,Breathing a lot/Unplanned breaths,Can't finish phrases                                                          0.00
  Breathing discomfort,Physical breathing effort,Air hunger,Chest tightness,Mental breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases                100.00
  Breathing discomfort,Physical breathing effort,Air hunger,Chest tightness,Mental breathing effort,Can't finish phrases                                                  100.00
  Breathing discomfort,Physical breathing effort,Air hunger,Chest tightness,Mental breathing effort,Unplanned breaths,Can't finish phrases                                 50.00
  Breathing discomfort,Physical breathing effort,Air hunger,Mental breathing effort                                                                                         0.00
  Breathing discomfort,Physical breathing effort,Air hunger,Mental breathing effort,Unplanned breaths                                                                       0.00
  Breathing discomfort,Physical breathing effort,Air hunger,Mental breathing effort,Unplanned breaths,Can't finish phrases                                                  0.00
  Breathing discomfort,Physical breathing effort,Breathing a lot/Unplanned breaths                                                                                        100.00
  Breathing discomfort,Physical breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases                                                                    50.00
  Breathing discomfort,Physical breathing effort,Can't finish phrases                                                                                                      66.67
  Breathing discomfort,Physical breathing effort,Chest tightness                                                                                                           33.33
  Breathing discomfort,Physical breathing effort,Chest tightness,Breathing a lot/Unplanned breaths                                                                          0.00
  Breathing discomfort,Physical breathing effort,Chest tightness,Breathing a lot/Unplanned breaths,Can't finish phrases                                                     0.00
  Breathing discomfort,Physical breathing effort,Chest tightness,Can't finish phrases                                                                                     100.00
  Breathing discomfort,Physical breathing effort,Chest tightness,Mental breathing effort                                                                                  100.00
  Breathing discomfort,Physical breathing effort,Chest tightness,Mental breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases                           100.00
  Breathing discomfort,Physical breathing effort,Chest tightness,Mental breathing effort,Unplanned breaths,Can't finish phrases                                           100.00
  Breathing discomfort,Physical breathing effort,Chest tightness,Unplanned breaths                                                                                         50.00
  Breathing discomfort,Physical breathing effort,Chest tightness,Unplanned breaths,Can't finish phrases                                                                   100.00
  Breathing discomfort,Physical breathing effort,Mental breathing effort,Breathing a lot/Unplanned breaths                                                                  0.00
  Breathing discomfort,Physical breathing effort,Mental breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases                                             0.00
  Breathing discomfort,Physical breathing effort,Mental breathing effort,Can't finish phrases                                                                              66.67
  Breathing discomfort,Physical breathing effort,Mental breathing effort,Unplanned breaths,Can't finish phrases                                                           100.00
  Breathing discomfort,Physical breathing effort,Unplanned breaths                                                                                                        100.00
  Breathing discomfort,Unplanned breaths                                                                                                                                   50.00
  Breathing discomfort,Unplanned breaths,Can't finish phrases                                                                                                               0.00
  Breathlessness                                                                                                                                                           38.46
  Breathlessness,Air hunger                                                                                                                                                54.55
  Breathlessness,Air hunger,Breathing a lot/Unplanned breaths                                                                                                              80.00
  Breathlessness,Air hunger,Breathing a lot/Unplanned breaths,Can't finish phrases                                                                                         28.12
  Breathlessness,Air hunger,Breathing a lot/Unplanned breaths,Can't finish phrases,Other                                                                                    0.00
  Breathlessness,Air hunger,Can't finish phrases                                                                                                                           18.75
  Breathlessness,Air hunger,Can't finish phrases,Other                                                                                                                      0.00
  Breathlessness,Air hunger,Chest tightness                                                                                                                                 0.00
  Breathlessness,Air hunger,Chest tightness,Breathing a lot/Unplanned breaths                                                                                              50.00
  Breathlessness,Air hunger,Chest tightness,Breathing a lot/Unplanned breaths,Can't finish phrases                                                                         60.00
  Breathlessness,Air hunger,Chest tightness,Breathing a lot/Unplanned breaths,Other                                                                                         0.00
  Breathlessness,Air hunger,Chest tightness,Can't finish phrases                                                                                                           75.00
  Breathlessness,Air hunger,Chest tightness,Mental breathing effort                                                                                                        33.33
  Breathlessness,Air hunger,Chest tightness,Mental breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases                                                  0.00
  Breathlessness,Air hunger,Chest tightness,Mental breathing effort,Can't finish phrases                                                                                   50.00
  Breathlessness,Air hunger,Chest tightness,Unplanned breaths                                                                                                             100.00
  Breathlessness,Air hunger,Chest tightness,Unplanned breaths,Can't finish phrases                                                                                         33.33
  Breathlessness,Air hunger,Mental breathing effort                                                                                                                         0.00
  Breathlessness,Air hunger,Mental breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases                                                                 50.00
  Breathlessness,Air hunger,Mental breathing effort,Breathing a lot/Unplanned breaths,Other                                                                                 0.00
  Breathlessness,Air hunger,Mental breathing effort,Can't finish phrases                                                                                                   60.00
  Breathlessness,Air hunger,Unplanned breaths,Can't finish phrases                                                                                                         42.86
  Breathlessness,Breathing a lot/Unplanned breaths                                                                                                                         33.33
  Breathlessness,Breathing a lot/Unplanned breaths,Can't finish phrases                                                                                                    31.25
  Breathlessness,Breathing a lot/Unplanned breaths,Can't finish phrases,Other                                                                                              50.00
  Breathlessness,Breathing discomfort                                                                                                                                      37.50
  Breathlessness,Breathing discomfort,Air hunger,Breathing a lot/Unplanned breaths                                                                                         50.00
  Breathlessness,Breathing discomfort,Air hunger,Breathing a lot/Unplanned breaths,Can't finish phrases                                                                    14.29
  Breathlessness,Breathing discomfort,Air hunger,Can't finish phrases                                                                                                      66.67
  Breathlessness,Breathing discomfort,Air hunger,Chest tightness                                                                                                           60.00
  Breathlessness,Breathing discomfort,Air hunger,Chest tightness,Breathing a lot/Unplanned breaths                                                                         50.00
  Breathlessness,Breathing discomfort,Air hunger,Chest tightness,Breathing a lot/Unplanned breaths,Can't finish phrases                                                    63.64
  Breathlessness,Breathing discomfort,Air hunger,Chest tightness,Can't finish phrases                                                                                      50.00
  Breathlessness,Breathing discomfort,Air hunger,Chest tightness,Mental breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases                           100.00
  Breathlessness,Breathing discomfort,Air hunger,Chest tightness,Mental breathing effort,Can't finish phrases                                                             100.00
  Breathlessness,Breathing discomfort,Air hunger,Chest tightness,Mental breathing effort,Unplanned breaths,Can't finish phrases                                           100.00
  Breathlessness,Breathing discomfort,Air hunger,Chest tightness,Unplanned breaths,Can't finish phrases                                                                   100.00
  Breathlessness,Breathing discomfort,Air hunger,Chest tightness,Unplanned breaths,Can't finish phrases,Other                                                               0.00
  Breathlessness,Breathing discomfort,Air hunger,Mental breathing effort                                                                                                  100.00
  Breathlessness,Breathing discomfort,Air hunger,Mental breathing effort,Unplanned breaths,Can't finish phrases                                                           100.00
  Breathlessness,Breathing discomfort,Air hunger,Other                                                                                                                    100.00
  Breathlessness,Breathing discomfort,Air hunger,Unplanned breaths,Can't finish phrases                                                                                   100.00
  Breathlessness,Breathing discomfort,Breathing a lot/Unplanned breaths,Can't finish phrases                                                                                0.00
  Breathlessness,Breathing discomfort,Can't finish phrases                                                                                                                 12.50
  Breathlessness,Breathing discomfort,Chest tightness                                                                                                                      71.43
  Breathlessness,Breathing discomfort,Chest tightness,Breathing a lot/Unplanned breaths                                                                                   100.00
  Breathlessness,Breathing discomfort,Chest tightness,Breathing a lot/Unplanned breaths,Can't finish phrases                                                                0.00
  Breathlessness,Breathing discomfort,Chest tightness,Can't finish phrases                                                                                                 60.00
  Breathlessness,Breathing discomfort,Chest tightness,Mental breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases                                        0.00
  Breathlessness,Breathing discomfort,Chest tightness,Mental breathing effort,Can't finish phrases                                                                        100.00
  Breathlessness,Breathing discomfort,Chest tightness,Unplanned breaths                                                                                                   100.00
  Breathlessness,Breathing discomfort,Chest tightness,Unplanned breaths,Can't finish phrases                                                                              100.00
  Breathlessness,Breathing discomfort,Mental breathing effort,Breathing a lot/Unplanned breaths                                                                             0.00
  Breathlessness,Breathing discomfort,Mental breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases                                                      100.00
  Breathlessness,Breathing discomfort,Mental breathing effort,Can't finish phrases                                                                                          0.00
  Breathlessness,Breathing discomfort,Physical breathing effort                                                                                                           100.00
  Breathlessness,Breathing discomfort,Physical breathing effort,Air hunger                                                                                                 75.00
  Breathlessness,Breathing discomfort,Physical breathing effort,Air hunger,Breathing a lot/Unplanned breaths                                                               50.00
  Breathlessness,Breathing discomfort,Physical breathing effort,Air hunger,Breathing a lot/Unplanned breaths,Can't finish phrases                                          28.57
  Breathlessness,Breathing discomfort,Physical breathing effort,Air hunger,Breathing a lot/Unplanned breaths,Can't finish phrases,Other                                     0.00
  Breathlessness,Breathing discomfort,Physical breathing effort,Air hunger,Can't finish phrases                                                                            50.00
  Breathlessness,Breathing discomfort,Physical breathing effort,Air hunger,Chest tightness                                                                                  0.00
  Breathlessness,Breathing discomfort,Physical breathing effort,Air hunger,Chest tightness,Breathing a lot/Unplanned breaths                                              100.00
  Breathlessness,Breathing discomfort,Physical breathing effort,Air hunger,Chest tightness,Breathing a lot/Unplanned breaths,Can't finish phrases                          80.00
  Breathlessness,Breathing discomfort,Physical breathing effort,Air hunger,Chest tightness,Can't finish phrases                                                            85.71
  Breathlessness,Breathing discomfort,Physical breathing effort,Air hunger,Chest tightness,Mental breathing effort                                                         66.67
  Breathlessness,Breathing discomfort,Physical breathing effort,Air hunger,Chest tightness,Mental breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases  77.78
  Breathlessness,Breathing discomfort,Physical breathing effort,Air hunger,Chest tightness,Mental breathing effort,Can't finish phrases                                   100.00
  Breathlessness,Breathing discomfort,Physical breathing effort,Air hunger,Chest tightness,Mental breathing effort,Unplanned breaths,Can't finish phrases                  85.71
  Breathlessness,Breathing discomfort,Physical breathing effort,Air hunger,Chest tightness,Unplanned breaths,Can't finish phrases                                           0.00
  Breathlessness,Breathing discomfort,Physical breathing effort,Air hunger,Mental breathing effort,Breathing a lot/Unplanned breaths                                      100.00
  Breathlessness,Breathing discomfort,Physical breathing effort,Air hunger,Mental breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases                  58.33
  Breathlessness,Breathing discomfort,Physical breathing effort,Air hunger,Mental breathing effort,Can't finish phrases                                                     0.00
  Breathlessness,Breathing discomfort,Physical breathing effort,Air hunger,Mental breathing effort,Unplanned breaths,Can't finish phrases                                  40.00
  Breathlessness,Breathing discomfort,Physical breathing effort,Air hunger,Unplanned breaths,Can't finish phrases                                                           0.00
  Breathlessness,Breathing discomfort,Physical breathing effort,Breathing a lot/Unplanned breaths                                                                           0.00
  Breathlessness,Breathing discomfort,Physical breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases                                                     33.33
  Breathlessness,Breathing discomfort,Physical breathing effort,Can't finish phrases                                                                                        0.00
  Breathlessness,Breathing discomfort,Physical breathing effort,Chest tightness                                                                                           100.00
  Breathlessness,Breathing discomfort,Physical breathing effort,Chest tightness,Breathing a lot/Unplanned breaths,Can't finish phrases                                     66.67
  Breathlessness,Breathing discomfort,Physical breathing effort,Chest tightness,Mental breathing effort                                                                     0.00
  Breathlessness,Breathing discomfort,Physical breathing effort,Chest tightness,Mental breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases            100.00
  Breathlessness,Breathing discomfort,Physical breathing effort,Chest tightness,Mental breathing effort,Can't finish phrases                                              100.00
  Breathlessness,Breathing discomfort,Physical breathing effort,Chest tightness,Mental breathing effort,Unplanned breaths,Can't finish phrases                             50.00
  Breathlessness,Breathing discomfort,Physical breathing effort,Mental breathing effort                                                                                   100.00
  Breathlessness,Breathing discomfort,Physical breathing effort,Mental breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases                              0.00
  Breathlessness,Breathing discomfort,Physical breathing effort,Mental breathing effort,Can't finish phrases                                                              100.00
  Breathlessness,Breathing discomfort,Physical breathing effort,Unplanned breaths                                                                                         100.00
  Breathlessness,Breathing discomfort,Physical breathing effort,Unplanned breaths,Can't finish phrases                                                                    100.00
  Breathlessness,Breathing discomfort,Unplanned breaths,Can't finish phrases                                                                                               50.00
  Breathlessness,Can't finish phrases                                                                                                                                      50.00
  Breathlessness,Can't finish phrases,Other                                                                                                                               100.00
  Breathlessness,Chest tightness                                                                                                                                           50.00
  Breathlessness,Chest tightness,Breathing a lot/Unplanned breaths                                                                                                          0.00
  Breathlessness,Chest tightness,Breathing a lot/Unplanned breaths,Can't finish phrases                                                                                     0.00
  Breathlessness,Chest tightness,Can't finish phrases                                                                                                                      30.77
  Breathlessness,Chest tightness,Mental breathing effort                                                                                                                    0.00
  Breathlessness,Chest tightness,Unplanned breaths,Can't finish phrases                                                                                                    66.67
  Breathlessness,Mental breathing effort                                                                                                                                  100.00
  Breathlessness,Mental breathing effort,Breathing a lot/Unplanned breaths                                                                                                100.00
  Breathlessness,Mental breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases                                                                           100.00
  Breathlessness,Mental breathing effort,Can't finish phrases                                                                                                              16.67
  Breathlessness,Mental breathing effort,Unplanned breaths                                                                                                                  0.00
  Breathlessness,Mental breathing effort,Unplanned breaths,Can't finish phrases                                                                                           100.00
  Breathlessness,Other                                                                                                                                                    100.00
  Breathlessness,Physical breathing effort                                                                                                                                  0.00
  Breathlessness,Physical breathing effort,Air hunger                                                                                                                     100.00
  Breathlessness,Physical breathing effort,Air hunger,Breathing a lot/Unplanned breaths                                                                                     0.00
  Breathlessness,Physical breathing effort,Air hunger,Breathing a lot/Unplanned breaths,Can't finish phrases                                                               25.00
  Breathlessness,Physical breathing effort,Air hunger,Can't finish phrases                                                                                                 33.33
  Breathlessness,Physical breathing effort,Air hunger,Chest tightness                                                                                                       0.00
  Breathlessness,Physical breathing effort,Air hunger,Chest tightness,Breathing a lot/Unplanned breaths,Can't finish phrases                                               14.29
  Breathlessness,Physical breathing effort,Air hunger,Chest tightness,Breathing a lot/Unplanned breaths,Can't finish phrases,Other                                        100.00
  Breathlessness,Physical breathing effort,Air hunger,Chest tightness,Mental breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases                       33.33
  Breathlessness,Physical breathing effort,Air hunger,Chest tightness,Mental breathing effort,Can't finish phrases                                                        100.00
  Breathlessness,Physical breathing effort,Air hunger,Chest tightness,Mental breathing effort,Unplanned breaths,Can't finish phrases                                      100.00
  Breathlessness,Physical breathing effort,Air hunger,Chest tightness,Unplanned breaths                                                                                     0.00
  Breathlessness,Physical breathing effort,Air hunger,Chest tightness,Unplanned breaths,Can't finish phrases                                                               66.67
  Breathlessness,Physical breathing effort,Air hunger,Mental breathing effort                                                                                               0.00
  Breathlessness,Physical breathing effort,Air hunger,Mental breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases                                       75.00
  Breathlessness,Physical breathing effort,Air hunger,Mental breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases,Other                                100.00
  Breathlessness,Physical breathing effort,Air hunger,Mental breathing effort,Can't finish phrases                                                                         25.00
  Breathlessness,Physical breathing effort,Air hunger,Mental breathing effort,Unplanned breaths,Can't finish phrases                                                       66.67
  Breathlessness,Physical breathing effort,Air hunger,Mental breathing effort,Unplanned breaths,Can't finish phrases,Other                                                100.00
  Breathlessness,Physical breathing effort,Air hunger,Unplanned breaths,Can't finish phrases                                                                               50.00
  Breathlessness,Physical breathing effort,Breathing a lot/Unplanned breaths                                                                                              100.00
  Breathlessness,Physical breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases                                                                          50.00
  Breathlessness,Physical breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases,Other                                                                    50.00
  Breathlessness,Physical breathing effort,Can't finish phrases                                                                                                            16.67
  Breathlessness,Physical breathing effort,Chest tightness                                                                                                                 50.00
  Breathlessness,Physical breathing effort,Chest tightness,Breathing a lot/Unplanned breaths,Can't finish phrases                                                          50.00
  Breathlessness,Physical breathing effort,Chest tightness,Can't finish phrases                                                                                            50.00
  Breathlessness,Physical breathing effort,Chest tightness,Mental breathing effort                                                                                          0.00
  Breathlessness,Physical breathing effort,Chest tightness,Mental breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases                                  50.00
  Breathlessness,Physical breathing effort,Chest tightness,Unplanned breaths,Can't finish phrases                                                                           0.00
  Breathlessness,Physical breathing effort,Mental breathing effort,Breathing a lot/Unplanned breaths                                                                       50.00
  Breathlessness,Physical breathing effort,Mental breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases                                                  80.00
  Breathlessness,Physical breathing effort,Mental breathing effort,Can't finish phrases                                                                                    75.00
  Breathlessness,Physical breathing effort,Mental breathing effort,Unplanned breaths                                                                                        0.00
  Breathlessness,Physical breathing effort,Mental breathing effort,Unplanned breaths,Can't finish phrases                                                                 100.00
  Breathlessness,Physical breathing effort,Unplanned breaths,Can't finish phrases                                                                                           0.00
  Breathlessness,Unplanned breaths                                                                                                                                        100.00
  Breathlessness,Unplanned breaths,Can't finish phrases                                                                                                                    63.64
  Can't finish phrases                                                                                                                                                     41.82
  Can't finish phrases,Breathing discomfort                                                                                                                                 0.00
  Can't finish phrases,Mental breathing effort                                                                                                                              0.00
  Can't finish phrases,Other                                                                                                                                                0.00
  Can't finish phrases,Unplanned breaths                                                                                                                                  100.00
  Chest tightness                                                                                                                                                          33.33
  Chest tightness,Breathing a lot/Unplanned breaths                                                                                                                       100.00
  Chest tightness,Breathing a lot/Unplanned breaths,Can't finish phrases                                                                                                    0.00
  Chest tightness,Can't finish phrases                                                                                                                                     50.00
  Chest tightness,Mental breathing effort                                                                                                                                   0.00
  Chest tightness,Mental breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases                                                                            0.00
  Chest tightness,Mental breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases,Other                                                                    100.00
  Chest tightness,Mental breathing effort,Can't finish phrases                                                                                                              0.00
  Chest tightness,Other                                                                                                                                                   100.00
  Chest tightness,Unplanned breaths                                                                                                                                        66.67
  Mental breathing effort                                                                                                                                                  23.53
  Mental breathing effort,Breathing a lot/Unplanned breaths                                                                                                                50.00
  Mental breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases                                                                                           50.00
  Mental breathing effort,Can't finish phrases                                                                                                                             28.57
  Mental breathing effort,Can't finish phrases,Other                                                                                                                      100.00
  Mental breathing effort,Other                                                                                                                                           100.00
  Mental breathing effort,Unplanned breaths,Can't finish phrases                                                                                                           75.00
  Misc/Unclear                                                                                                                                                              0.00
  None of the above                                                                                                                                                       100.00
  Other                                                                                                                                                                     0.00
  Physical breathing effort                                                                                                                                                47.83
  Physical breathing effort,Air hunger                                                                                                                                     66.67
  Physical breathing effort,Air hunger,Breathing a lot/Unplanned breaths                                                                                                    0.00
  Physical breathing effort,Air hunger,Breathing a lot/Unplanned breaths,Can't finish phrases                                                                              50.00
  Physical breathing effort,Air hunger,Can't finish phrases                                                                                                                50.00
  Physical breathing effort,Air hunger,Chest tightness                                                                                                                     50.00
  Physical breathing effort,Air hunger,Chest tightness,Can't finish phrases                                                                                                60.00
  Physical breathing effort,Air hunger,Chest tightness,Mental breathing effort                                                                                              0.00
  Physical breathing effort,Air hunger,Chest tightness,Mental breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases                                     100.00
  Physical breathing effort,Air hunger,Chest tightness,Mental breathing effort,Can't finish phrases                                                                       100.00
  Physical breathing effort,Air hunger,Mental breathing effort                                                                                                            100.00
  Physical breathing effort,Air hunger,Mental breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases                                                       0.00
  Physical breathing effort,Air hunger,Mental breathing effort,Can't finish phrases                                                                                        66.67
  Physical breathing effort,Air hunger,Mental breathing effort,Unplanned breaths,Can't finish phrases                                                                      50.00
  Physical breathing effort,Air hunger,Unplanned breaths                                                                                                                    0.00
  Physical breathing effort,Air hunger,Unplanned breaths,Can't finish phrases                                                                                               0.00
  Physical breathing effort,Breathing a lot/Unplanned breaths                                                                                                              50.00
  Physical breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases                                                                                         50.00
  Physical breathing effort,Breathing a lot/Unplanned breaths,Other                                                                                                         0.00
  Physical breathing effort,Can't finish phrases                                                                                                                           50.00
  Physical breathing effort,Can't finish phrases,Other                                                                                                                      0.00
  Physical breathing effort,Chest tightness                                                                                                                               100.00
  Physical breathing effort,Chest tightness,Breathing a lot/Unplanned breaths                                                                                               0.00
  Physical breathing effort,Chest tightness,Breathing a lot/Unplanned breaths,Can't finish phrases                                                                          0.00
  Physical breathing effort,Chest tightness,Can't finish phrases                                                                                                           33.33
  Physical breathing effort,Chest tightness,Mental breathing effort                                                                                                       100.00
  Physical breathing effort,Chest tightness,Mental breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases                                                100.00
  Physical breathing effort,Chest tightness,Mental breathing effort,Can't finish phrases                                                                                  100.00
  Physical breathing effort,Chest tightness,Unplanned breaths                                                                                                             100.00
  Physical breathing effort,Chest tightness,Unplanned breaths,Can't finish phrases                                                                                          0.00
  Physical breathing effort,Mental breathing effort                                                                                                                        55.56
  Physical breathing effort,Mental breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases                                                                 33.33
  Physical breathing effort,Mental breathing effort,Can't finish phrases                                                                                                   75.00
  Physical breathing effort,Mental breathing effort,Other                                                                                                                 100.00
  Physical breathing effort,Mental breathing effort,Unplanned breaths                                                                                                      50.00
  Physical breathing effort,Mental breathing effort,Unplanned breaths,Can't finish phrases                                                                                100.00
  Physical breathing effort,Other                                                                                                                                          50.00
  Physical breathing effort,Unplanned breaths,Can't finish phrases                                                                                                        100.00
  Physical breathing effort,Unplanned breaths,Can't finish phrases,Other                                                                                                    0.00
  Unplanned breaths                                                                                                                                                        50.00
  Unplanned breaths,Can't finish phrases                                                                                                                                   52.00

 dyspSymptoms vs useInstrument 
Contingency Table (Counts):
                                                                                                                                                                         
                                                                                                                                                                           0
  Air hunger                                                                                                                                                              17
  Air hunger,Breathing a lot/Unplanned breaths                                                                                                                             0
  Air hunger,Breathing a lot/Unplanned breaths,Can't finish phrases                                                                                                       10
  Air hunger,Can't finish phrases                                                                                                                                         10
  Air hunger,Can't finish phrases,Other                                                                                                                                    1
  Air hunger,Chest tightness                                                                                                                                               2
  Air hunger,Chest tightness,Breathing a lot/Unplanned breaths                                                                                                             1
  Air hunger,Chest tightness,Breathing a lot/Unplanned breaths,Can't finish phrases                                                                                        0
  Air hunger,Chest tightness,Can't finish phrases                                                                                                                          4
  Air hunger,Chest tightness,Mental breathing effort                                                                                                                       0
  Air hunger,Chest tightness,Mental breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases                                                                0
  Air hunger,Chest tightness,Mental breathing effort,Unplanned breaths                                                                                                     0
  Air hunger,Chest tightness,Unplanned breaths                                                                                                                             0
  Air hunger,Chest tightness,Unplanned breaths,Can't finish phrases                                                                                                        0
  Air hunger,Mental breathing effort                                                                                                                                       3
  Air hunger,Mental breathing effort,Breathing a lot/Unplanned breaths                                                                                                     0
  Air hunger,Mental breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases                                                                                1
  Air hunger,Mental breathing effort,Can't finish phrases                                                                                                                  2
  Air hunger,Mental breathing effort,Unplanned breaths                                                                                                                     0
  Air hunger,Unplanned breaths                                                                                                                                             1
  Air hunger,Unplanned breaths,Can't finish phrases                                                                                                                        3
  Breathing a lot/Unplanned breaths                                                                                                                                        5
  Breathing a lot/Unplanned breaths,Can't finish phrases                                                                                                                  17
  Breathing a lot/Unplanned breaths,Other                                                                                                                                  1
  Breathing discomfort                                                                                                                                                    11
  Breathing discomfort,Air hunger                                                                                                                                          3
  Breathing discomfort,Air hunger,Breathing a lot/Unplanned breaths                                                                                                        0
  Breathing discomfort,Air hunger,Breathing a lot/Unplanned breaths,Can't finish phrases                                                                                   1
  Breathing discomfort,Air hunger,Can't finish phrases                                                                                                                     1
  Breathing discomfort,Air hunger,Chest tightness                                                                                                                          0
  Breathing discomfort,Air hunger,Chest tightness,Breathing a lot/Unplanned breaths                                                                                        0
  Breathing discomfort,Air hunger,Chest tightness,Breathing a lot/Unplanned breaths,Can't finish phrases                                                                   0
  Breathing discomfort,Air hunger,Chest tightness,Can't finish phrases                                                                                                     0
  Breathing discomfort,Air hunger,Chest tightness,Mental breathing effort                                                                                                  0
  Breathing discomfort,Air hunger,Chest tightness,Mental breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases                                           1
  Breathing discomfort,Air hunger,Chest tightness,Mental breathing effort,Can't finish phrases                                                                             0
  Breathing discomfort,Air hunger,Mental breathing effort                                                                                                                  0
  Breathing discomfort,Air hunger,Mental breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases                                                           0
  Breathing discomfort,Air hunger,Mental breathing effort,Can't finish phrases                                                                                             0
  Breathing discomfort,Air hunger,Mental breathing effort,Unplanned breaths,Can't finish phrases                                                                           0
  Breathing discomfort,Air hunger,Other                                                                                                                                    1
  Breathing discomfort,Air hunger,Unplanned breaths                                                                                                                        0
  Breathing discomfort,Breathing a lot/Unplanned breaths                                                                                                                   1
  Breathing discomfort,Breathing a lot/Unplanned breaths,Can't finish phrases                                                                                              0
  Breathing discomfort,Can't finish phrases                                                                                                                                2
  Breathing discomfort,Chest tightness                                                                                                                                     2
  Breathing discomfort,Chest tightness,Breathing a lot/Unplanned breaths                                                                                                   0
  Breathing discomfort,Chest tightness,Can't finish phrases                                                                                                                2
  Breathing discomfort,Chest tightness,Mental breathing effort                                                                                                             1
  Breathing discomfort,Chest tightness,Mental breathing effort,Breathing a lot/Unplanned breaths                                                                           1
  Breathing discomfort,Chest tightness,Unplanned breaths                                                                                                                   1
  Breathing discomfort,Chest tightness,Unplanned breaths,Can't finish phrases                                                                                              0
  Breathing discomfort,Mental breathing effort                                                                                                                             0
  Breathing discomfort,Mental breathing effort,Can't finish phrases                                                                                                        0
  Breathing discomfort,Physical breathing effort                                                                                                                           2
  Breathing discomfort,Physical breathing effort,Air hunger                                                                                                                1
  Breathing discomfort,Physical breathing effort,Air hunger,Breathing a lot/Unplanned breaths,Can't finish phrases                                                         2
  Breathing discomfort,Physical breathing effort,Air hunger,Chest tightness,Mental breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases                 1
  Breathing discomfort,Physical breathing effort,Air hunger,Chest tightness,Mental breathing effort,Can't finish phrases                                                   0
  Breathing discomfort,Physical breathing effort,Air hunger,Chest tightness,Mental breathing effort,Unplanned breaths,Can't finish phrases                                 0
  Breathing discomfort,Physical breathing effort,Air hunger,Mental breathing effort                                                                                        0
  Breathing discomfort,Physical breathing effort,Air hunger,Mental breathing effort,Unplanned breaths                                                                      1
  Breathing discomfort,Physical breathing effort,Air hunger,Mental breathing effort,Unplanned breaths,Can't finish phrases                                                 0
  Breathing discomfort,Physical breathing effort,Breathing a lot/Unplanned breaths                                                                                         0
  Breathing discomfort,Physical breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases                                                                    0
  Breathing discomfort,Physical breathing effort,Can't finish phrases                                                                                                      2
  Breathing discomfort,Physical breathing effort,Chest tightness                                                                                                           0
  Breathing discomfort,Physical breathing effort,Chest tightness,Breathing a lot/Unplanned breaths                                                                         1
  Breathing discomfort,Physical breathing effort,Chest tightness,Breathing a lot/Unplanned breaths,Can't finish phrases                                                    1
  Breathing discomfort,Physical breathing effort,Chest tightness,Can't finish phrases                                                                                      0
  Breathing discomfort,Physical breathing effort,Chest tightness,Mental breathing effort                                                                                   0
  Breathing discomfort,Physical breathing effort,Chest tightness,Mental breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases                            0
  Breathing discomfort,Physical breathing effort,Chest tightness,Mental breathing effort,Unplanned breaths,Can't finish phrases                                            0
  Breathing discomfort,Physical breathing effort,Chest tightness,Unplanned breaths                                                                                         0
  Breathing discomfort,Physical breathing effort,Chest tightness,Unplanned breaths,Can't finish phrases                                                                    0
  Breathing discomfort,Physical breathing effort,Mental breathing effort,Breathing a lot/Unplanned breaths                                                                 1
  Breathing discomfort,Physical breathing effort,Mental breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases                                            1
  Breathing discomfort,Physical breathing effort,Mental breathing effort,Can't finish phrases                                                                              1
  Breathing discomfort,Physical breathing effort,Mental breathing effort,Unplanned breaths,Can't finish phrases                                                            0
  Breathing discomfort,Physical breathing effort,Unplanned breaths                                                                                                         0
  Breathing discomfort,Unplanned breaths                                                                                                                                   1
  Breathing discomfort,Unplanned breaths,Can't finish phrases                                                                                                              0
  Breathlessness                                                                                                                                                          13
  Breathlessness,Air hunger                                                                                                                                                3
  Breathlessness,Air hunger,Breathing a lot/Unplanned breaths                                                                                                              0
  Breathlessness,Air hunger,Breathing a lot/Unplanned breaths,Can't finish phrases                                                                                         9
  Breathlessness,Air hunger,Breathing a lot/Unplanned breaths,Can't finish phrases,Other                                                                                   0
  Breathlessness,Air hunger,Can't finish phrases                                                                                                                           3
  Breathlessness,Air hunger,Can't finish phrases,Other                                                                                                                     0
  Breathlessness,Air hunger,Chest tightness                                                                                                                                1
  Breathlessness,Air hunger,Chest tightness,Breathing a lot/Unplanned breaths                                                                                              0
  Breathlessness,Air hunger,Chest tightness,Breathing a lot/Unplanned breaths,Can't finish phrases                                                                         2
  Breathlessness,Air hunger,Chest tightness,Breathing a lot/Unplanned breaths,Other                                                                                        1
  Breathlessness,Air hunger,Chest tightness,Can't finish phrases                                                                                                           0
  Breathlessness,Air hunger,Chest tightness,Mental breathing effort                                                                                                        3
  Breathlessness,Air hunger,Chest tightness,Mental breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases                                                 1
  Breathlessness,Air hunger,Chest tightness,Mental breathing effort,Can't finish phrases                                                                                   0
  Breathlessness,Air hunger,Chest tightness,Unplanned breaths                                                                                                              0
  Breathlessness,Air hunger,Chest tightness,Unplanned breaths,Can't finish phrases                                                                                         1
  Breathlessness,Air hunger,Mental breathing effort                                                                                                                        1
  Breathlessness,Air hunger,Mental breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases                                                                 2
  Breathlessness,Air hunger,Mental breathing effort,Breathing a lot/Unplanned breaths,Other                                                                                0
  Breathlessness,Air hunger,Mental breathing effort,Can't finish phrases                                                                                                   1
  Breathlessness,Air hunger,Unplanned breaths,Can't finish phrases                                                                                                         1
  Breathlessness,Breathing a lot/Unplanned breaths                                                                                                                         3
  Breathlessness,Breathing a lot/Unplanned breaths,Can't finish phrases                                                                                                    7
  Breathlessness,Breathing a lot/Unplanned breaths,Can't finish phrases,Other                                                                                              1
  Breathlessness,Breathing discomfort                                                                                                                                      4
  Breathlessness,Breathing discomfort,Air hunger,Breathing a lot/Unplanned breaths                                                                                         1
  Breathlessness,Breathing discomfort,Air hunger,Breathing a lot/Unplanned breaths,Can't finish phrases                                                                    2
  Breathlessness,Breathing discomfort,Air hunger,Can't finish phrases                                                                                                      1
  Breathlessness,Breathing discomfort,Air hunger,Chest tightness                                                                                                           1
  Breathlessness,Breathing discomfort,Air hunger,Chest tightness,Breathing a lot/Unplanned breaths                                                                         1
  Breathlessness,Breathing discomfort,Air hunger,Chest tightness,Breathing a lot/Unplanned breaths,Can't finish phrases                                                    4
  Breathlessness,Breathing discomfort,Air hunger,Chest tightness,Can't finish phrases                                                                                      0
  Breathlessness,Breathing discomfort,Air hunger,Chest tightness,Mental breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases                            0
  Breathlessness,Breathing discomfort,Air hunger,Chest tightness,Mental breathing effort,Can't finish phrases                                                              1
  Breathlessness,Breathing discomfort,Air hunger,Chest tightness,Mental breathing effort,Unplanned breaths,Can't finish phrases                                            0
  Breathlessness,Breathing discomfort,Air hunger,Chest tightness,Unplanned breaths,Can't finish phrases                                                                    0
  Breathlessness,Breathing discomfort,Air hunger,Chest tightness,Unplanned breaths,Can't finish phrases,Other                                                              0
  Breathlessness,Breathing discomfort,Air hunger,Mental breathing effort                                                                                                   0
  Breathlessness,Breathing discomfort,Air hunger,Mental breathing effort,Unplanned breaths,Can't finish phrases                                                            0
  Breathlessness,Breathing discomfort,Air hunger,Other                                                                                                                     0
  Breathlessness,Breathing discomfort,Air hunger,Unplanned breaths,Can't finish phrases                                                                                    1
  Breathlessness,Breathing discomfort,Breathing a lot/Unplanned breaths,Can't finish phrases                                                                               2
  Breathlessness,Breathing discomfort,Can't finish phrases                                                                                                                 2
  Breathlessness,Breathing discomfort,Chest tightness                                                                                                                      1
  Breathlessness,Breathing discomfort,Chest tightness,Breathing a lot/Unplanned breaths                                                                                    0
  Breathlessness,Breathing discomfort,Chest tightness,Breathing a lot/Unplanned breaths,Can't finish phrases                                                               1
  Breathlessness,Breathing discomfort,Chest tightness,Can't finish phrases                                                                                                 2
  Breathlessness,Breathing discomfort,Chest tightness,Mental breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases                                       0
  Breathlessness,Breathing discomfort,Chest tightness,Mental breathing effort,Can't finish phrases                                                                         0
  Breathlessness,Breathing discomfort,Chest tightness,Unplanned breaths                                                                                                    0
  Breathlessness,Breathing discomfort,Chest tightness,Unplanned breaths,Can't finish phrases                                                                               0
  Breathlessness,Breathing discomfort,Mental breathing effort,Breathing a lot/Unplanned breaths                                                                            0
  Breathlessness,Breathing discomfort,Mental breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases                                                       1
  Breathlessness,Breathing discomfort,Mental breathing effort,Can't finish phrases                                                                                         0
  Breathlessness,Breathing discomfort,Physical breathing effort                                                                                                            0
  Breathlessness,Breathing discomfort,Physical breathing effort,Air hunger                                                                                                 0
  Breathlessness,Breathing discomfort,Physical breathing effort,Air hunger,Breathing a lot/Unplanned breaths                                                               0
  Breathlessness,Breathing discomfort,Physical breathing effort,Air hunger,Breathing a lot/Unplanned breaths,Can't finish phrases                                          1
  Breathlessness,Breathing discomfort,Physical breathing effort,Air hunger,Breathing a lot/Unplanned breaths,Can't finish phrases,Other                                    0
  Breathlessness,Breathing discomfort,Physical breathing effort,Air hunger,Can't finish phrases                                                                            0
  Breathlessness,Breathing discomfort,Physical breathing effort,Air hunger,Chest tightness                                                                                 0
  Breathlessness,Breathing discomfort,Physical breathing effort,Air hunger,Chest tightness,Breathing a lot/Unplanned breaths                                               0
  Breathlessness,Breathing discomfort,Physical breathing effort,Air hunger,Chest tightness,Breathing a lot/Unplanned breaths,Can't finish phrases                          0
  Breathlessness,Breathing discomfort,Physical breathing effort,Air hunger,Chest tightness,Can't finish phrases                                                            2
  Breathlessness,Breathing discomfort,Physical breathing effort,Air hunger,Chest tightness,Mental breathing effort                                                         0
  Breathlessness,Breathing discomfort,Physical breathing effort,Air hunger,Chest tightness,Mental breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases  4
  Breathlessness,Breathing discomfort,Physical breathing effort,Air hunger,Chest tightness,Mental breathing effort,Can't finish phrases                                    1
  Breathlessness,Breathing discomfort,Physical breathing effort,Air hunger,Chest tightness,Mental breathing effort,Unplanned breaths,Can't finish phrases                  0
  Breathlessness,Breathing discomfort,Physical breathing effort,Air hunger,Chest tightness,Unplanned breaths,Can't finish phrases                                          1
  Breathlessness,Breathing discomfort,Physical breathing effort,Air hunger,Mental breathing effort,Breathing a lot/Unplanned breaths                                       1
  Breathlessness,Breathing discomfort,Physical breathing effort,Air hunger,Mental breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases                  3
  Breathlessness,Breathing discomfort,Physical breathing effort,Air hunger,Mental breathing effort,Can't finish phrases                                                    1
  Breathlessness,Breathing discomfort,Physical breathing effort,Air hunger,Mental breathing effort,Unplanned breaths,Can't finish phrases                                  0
  Breathlessness,Breathing discomfort,Physical breathing effort,Air hunger,Unplanned breaths,Can't finish phrases                                                          1
  Breathlessness,Breathing discomfort,Physical breathing effort,Breathing a lot/Unplanned breaths                                                                          0
  Breathlessness,Breathing discomfort,Physical breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases                                                     1
  Breathlessness,Breathing discomfort,Physical breathing effort,Can't finish phrases                                                                                       2
  Breathlessness,Breathing discomfort,Physical breathing effort,Chest tightness                                                                                            0
  Breathlessness,Breathing discomfort,Physical breathing effort,Chest tightness,Breathing a lot/Unplanned breaths,Can't finish phrases                                     1
  Breathlessness,Breathing discomfort,Physical breathing effort,Chest tightness,Mental breathing effort                                                                    1
  Breathlessness,Breathing discomfort,Physical breathing effort,Chest tightness,Mental breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases             0
  Breathlessness,Breathing discomfort,Physical breathing effort,Chest tightness,Mental breathing effort,Can't finish phrases                                               1
  Breathlessness,Breathing discomfort,Physical breathing effort,Chest tightness,Mental breathing effort,Unplanned breaths,Can't finish phrases                             0
  Breathlessness,Breathing discomfort,Physical breathing effort,Mental breathing effort                                                                                    0
  Breathlessness,Breathing discomfort,Physical breathing effort,Mental breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases                             1
  Breathlessness,Breathing discomfort,Physical breathing effort,Mental breathing effort,Can't finish phrases                                                               0
  Breathlessness,Breathing discomfort,Physical breathing effort,Unplanned breaths                                                                                          0
  Breathlessness,Breathing discomfort,Physical breathing effort,Unplanned breaths,Can't finish phrases                                                                     0
  Breathlessness,Breathing discomfort,Unplanned breaths,Can't finish phrases                                                                                               0
  Breathlessness,Can't finish phrases                                                                                                                                     10
  Breathlessness,Can't finish phrases,Other                                                                                                                                1
  Breathlessness,Chest tightness                                                                                                                                           1
  Breathlessness,Chest tightness,Breathing a lot/Unplanned breaths                                                                                                         1
  Breathlessness,Chest tightness,Breathing a lot/Unplanned breaths,Can't finish phrases                                                                                    1
  Breathlessness,Chest tightness,Can't finish phrases                                                                                                                      6
  Breathlessness,Chest tightness,Mental breathing effort                                                                                                                   1
  Breathlessness,Chest tightness,Unplanned breaths,Can't finish phrases                                                                                                    1
  Breathlessness,Mental breathing effort                                                                                                                                   0
  Breathlessness,Mental breathing effort,Breathing a lot/Unplanned breaths                                                                                                 1
  Breathlessness,Mental breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases                                                                            0
  Breathlessness,Mental breathing effort,Can't finish phrases                                                                                                              3
  Breathlessness,Mental breathing effort,Unplanned breaths                                                                                                                 0
  Breathlessness,Mental breathing effort,Unplanned breaths,Can't finish phrases                                                                                            0
  Breathlessness,Other                                                                                                                                                     1
  Breathlessness,Physical breathing effort                                                                                                                                 3
  Breathlessness,Physical breathing effort,Air hunger                                                                                                                      0
  Breathlessness,Physical breathing effort,Air hunger,Breathing a lot/Unplanned breaths                                                                                    0
  Breathlessness,Physical breathing effort,Air hunger,Breathing a lot/Unplanned breaths,Can't finish phrases                                                               1
  Breathlessness,Physical breathing effort,Air hunger,Can't finish phrases                                                                                                 4
  Breathlessness,Physical breathing effort,Air hunger,Chest tightness                                                                                                      0
  Breathlessness,Physical breathing effort,Air hunger,Chest tightness,Breathing a lot/Unplanned breaths,Can't finish phrases                                               1
  Breathlessness,Physical breathing effort,Air hunger,Chest tightness,Breathing a lot/Unplanned breaths,Can't finish phrases,Other                                         0
  Breathlessness,Physical breathing effort,Air hunger,Chest tightness,Mental breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases                       3
  Breathlessness,Physical breathing effort,Air hunger,Chest tightness,Mental breathing effort,Can't finish phrases                                                         0
  Breathlessness,Physical breathing effort,Air hunger,Chest tightness,Mental breathing effort,Unplanned breaths,Can't finish phrases                                       0
  Breathlessness,Physical breathing effort,Air hunger,Chest tightness,Unplanned breaths                                                                                    0
  Breathlessness,Physical breathing effort,Air hunger,Chest tightness,Unplanned breaths,Can't finish phrases                                                               0
  Breathlessness,Physical breathing effort,Air hunger,Mental breathing effort                                                                                              0
  Breathlessness,Physical breathing effort,Air hunger,Mental breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases                                       2
  Breathlessness,Physical breathing effort,Air hunger,Mental breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases,Other                                 0
  Breathlessness,Physical breathing effort,Air hunger,Mental breathing effort,Can't finish phrases                                                                         1
  Breathlessness,Physical breathing effort,Air hunger,Mental breathing effort,Unplanned breaths,Can't finish phrases                                                       1
  Breathlessness,Physical breathing effort,Air hunger,Mental breathing effort,Unplanned breaths,Can't finish phrases,Other                                                 0
  Breathlessness,Physical breathing effort,Air hunger,Unplanned breaths,Can't finish phrases                                                                               0
  Breathlessness,Physical breathing effort,Breathing a lot/Unplanned breaths                                                                                               0
  Breathlessness,Physical breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases                                                                          1
  Breathlessness,Physical breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases,Other                                                                    1
  Breathlessness,Physical breathing effort,Can't finish phrases                                                                                                            0
  Breathlessness,Physical breathing effort,Chest tightness                                                                                                                 3
  Breathlessness,Physical breathing effort,Chest tightness,Breathing a lot/Unplanned breaths,Can't finish phrases                                                          1
  Breathlessness,Physical breathing effort,Chest tightness,Can't finish phrases                                                                                            0
  Breathlessness,Physical breathing effort,Chest tightness,Mental breathing effort                                                                                         0
  Breathlessness,Physical breathing effort,Chest tightness,Mental breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases                                  0
  Breathlessness,Physical breathing effort,Chest tightness,Unplanned breaths,Can't finish phrases                                                                          0
  Breathlessness,Physical breathing effort,Mental breathing effort,Breathing a lot/Unplanned breaths                                                                       0
  Breathlessness,Physical breathing effort,Mental breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases                                                  0
  Breathlessness,Physical breathing effort,Mental breathing effort,Can't finish phrases                                                                                    1
  Breathlessness,Physical breathing effort,Mental breathing effort,Unplanned breaths                                                                                       1
  Breathlessness,Physical breathing effort,Mental breathing effort,Unplanned breaths,Can't finish phrases                                                                  0
  Breathlessness,Physical breathing effort,Unplanned breaths,Can't finish phrases                                                                                          1
  Breathlessness,Unplanned breaths                                                                                                                                         0
  Breathlessness,Unplanned breaths,Can't finish phrases                                                                                                                    2
  Can't finish phrases                                                                                                                                                    31
  Can't finish phrases,Breathing discomfort                                                                                                                                0
  Can't finish phrases,Mental breathing effort                                                                                                                             0
  Can't finish phrases,Other                                                                                                                                               1
  Can't finish phrases,Unplanned breaths                                                                                                                                   0
  Chest tightness                                                                                                                                                         11
  Chest tightness,Breathing a lot/Unplanned breaths                                                                                                                        0
  Chest tightness,Breathing a lot/Unplanned breaths,Can't finish phrases                                                                                                   1
  Chest tightness,Can't finish phrases                                                                                                                                     1
  Chest tightness,Mental breathing effort                                                                                                                                  0
  Chest tightness,Mental breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases                                                                           0
  Chest tightness,Mental breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases,Other                                                                     0
  Chest tightness,Mental breathing effort,Can't finish phrases                                                                                                             0
  Chest tightness,Other                                                                                                                                                    0
  Chest tightness,Unplanned breaths                                                                                                                                        1
  Mental breathing effort                                                                                                                                                  9
  Mental breathing effort,Breathing a lot/Unplanned breaths                                                                                                                0
  Mental breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases                                                                                           1
  Mental breathing effort,Can't finish phrases                                                                                                                             2
  Mental breathing effort,Can't finish phrases,Other                                                                                                                       1
  Mental breathing effort,Other                                                                                                                                            0
  Mental breathing effort,Unplanned breaths,Can't finish phrases                                                                                                           1
  Misc/Unclear                                                                                                                                                             0
  None of the above                                                                                                                                                        0
  Other                                                                                                                                                                    1
  Physical breathing effort                                                                                                                                                5
  Physical breathing effort,Air hunger                                                                                                                                     1
  Physical breathing effort,Air hunger,Breathing a lot/Unplanned breaths                                                                                                   0
  Physical breathing effort,Air hunger,Breathing a lot/Unplanned breaths,Can't finish phrases                                                                              0
  Physical breathing effort,Air hunger,Can't finish phrases                                                                                                                0
  Physical breathing effort,Air hunger,Chest tightness                                                                                                                     1
  Physical breathing effort,Air hunger,Chest tightness,Can't finish phrases                                                                                                0
  Physical breathing effort,Air hunger,Chest tightness,Mental breathing effort                                                                                             0
  Physical breathing effort,Air hunger,Chest tightness,Mental breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases                                      0
  Physical breathing effort,Air hunger,Chest tightness,Mental breathing effort,Can't finish phrases                                                                        0
  Physical breathing effort,Air hunger,Mental breathing effort                                                                                                             0
  Physical breathing effort,Air hunger,Mental breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases                                                      1
  Physical breathing effort,Air hunger,Mental breathing effort,Can't finish phrases                                                                                        0
  Physical breathing effort,Air hunger,Mental breathing effort,Unplanned breaths,Can't finish phrases                                                                      0
  Physical breathing effort,Air hunger,Unplanned breaths                                                                                                                   1
  Physical breathing effort,Air hunger,Unplanned breaths,Can't finish phrases                                                                                              0
  Physical breathing effort,Breathing a lot/Unplanned breaths                                                                                                              1
  Physical breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases                                                                                         3
  Physical breathing effort,Breathing a lot/Unplanned breaths,Other                                                                                                        1
  Physical breathing effort,Can't finish phrases                                                                                                                           1
  Physical breathing effort,Can't finish phrases,Other                                                                                                                     0
  Physical breathing effort,Chest tightness                                                                                                                                1
  Physical breathing effort,Chest tightness,Breathing a lot/Unplanned breaths                                                                                              1
  Physical breathing effort,Chest tightness,Breathing a lot/Unplanned breaths,Can't finish phrases                                                                         1
  Physical breathing effort,Chest tightness,Can't finish phrases                                                                                                           1
  Physical breathing effort,Chest tightness,Mental breathing effort                                                                                                        0
  Physical breathing effort,Chest tightness,Mental breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases                                                 0
  Physical breathing effort,Chest tightness,Mental breathing effort,Can't finish phrases                                                                                   0
  Physical breathing effort,Chest tightness,Unplanned breaths                                                                                                              1
  Physical breathing effort,Chest tightness,Unplanned breaths,Can't finish phrases                                                                                         0
  Physical breathing effort,Mental breathing effort                                                                                                                        3
  Physical breathing effort,Mental breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases                                                                 0
  Physical breathing effort,Mental breathing effort,Can't finish phrases                                                                                                   1
  Physical breathing effort,Mental breathing effort,Other                                                                                                                  0
  Physical breathing effort,Mental breathing effort,Unplanned breaths                                                                                                      3
  Physical breathing effort,Mental breathing effort,Unplanned breaths,Can't finish phrases                                                                                 1
  Physical breathing effort,Other                                                                                                                                          1
  Physical breathing effort,Unplanned breaths,Can't finish phrases                                                                                                         0
  Physical breathing effort,Unplanned breaths,Can't finish phrases,Other                                                                                                   1
  Unplanned breaths                                                                                                                                                        4
  Unplanned breaths,Can't finish phrases                                                                                                                                   2
                                                                                                                                                                         
                                                                                                                                                                           1
  Air hunger                                                                                                                                                              14
  Air hunger,Breathing a lot/Unplanned breaths                                                                                                                             6
  Air hunger,Breathing a lot/Unplanned breaths,Can't finish phrases                                                                                                       19
  Air hunger,Can't finish phrases                                                                                                                                         24
  Air hunger,Can't finish phrases,Other                                                                                                                                    1
  Air hunger,Chest tightness                                                                                                                                               4
  Air hunger,Chest tightness,Breathing a lot/Unplanned breaths                                                                                                             0
  Air hunger,Chest tightness,Breathing a lot/Unplanned breaths,Can't finish phrases                                                                                        3
  Air hunger,Chest tightness,Can't finish phrases                                                                                                                          3
  Air hunger,Chest tightness,Mental breathing effort                                                                                                                       2
  Air hunger,Chest tightness,Mental breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases                                                                1
  Air hunger,Chest tightness,Mental breathing effort,Unplanned breaths                                                                                                     1
  Air hunger,Chest tightness,Unplanned breaths                                                                                                                             1
  Air hunger,Chest tightness,Unplanned breaths,Can't finish phrases                                                                                                        2
  Air hunger,Mental breathing effort                                                                                                                                       6
  Air hunger,Mental breathing effort,Breathing a lot/Unplanned breaths                                                                                                     4
  Air hunger,Mental breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases                                                                                9
  Air hunger,Mental breathing effort,Can't finish phrases                                                                                                                  9
  Air hunger,Mental breathing effort,Unplanned breaths                                                                                                                     2
  Air hunger,Unplanned breaths                                                                                                                                             2
  Air hunger,Unplanned breaths,Can't finish phrases                                                                                                                        6
  Breathing a lot/Unplanned breaths                                                                                                                                        6
  Breathing a lot/Unplanned breaths,Can't finish phrases                                                                                                                  25
  Breathing a lot/Unplanned breaths,Other                                                                                                                                  0
  Breathing discomfort                                                                                                                                                     8
  Breathing discomfort,Air hunger                                                                                                                                          0
  Breathing discomfort,Air hunger,Breathing a lot/Unplanned breaths                                                                                                        2
  Breathing discomfort,Air hunger,Breathing a lot/Unplanned breaths,Can't finish phrases                                                                                   1
  Breathing discomfort,Air hunger,Can't finish phrases                                                                                                                     4
  Breathing discomfort,Air hunger,Chest tightness                                                                                                                          2
  Breathing discomfort,Air hunger,Chest tightness,Breathing a lot/Unplanned breaths                                                                                        1
  Breathing discomfort,Air hunger,Chest tightness,Breathing a lot/Unplanned breaths,Can't finish phrases                                                                   1
  Breathing discomfort,Air hunger,Chest tightness,Can't finish phrases                                                                                                     2
  Breathing discomfort,Air hunger,Chest tightness,Mental breathing effort                                                                                                  2
  Breathing discomfort,Air hunger,Chest tightness,Mental breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases                                           1
  Breathing discomfort,Air hunger,Chest tightness,Mental breathing effort,Can't finish phrases                                                                             1
  Breathing discomfort,Air hunger,Mental breathing effort                                                                                                                  4
  Breathing discomfort,Air hunger,Mental breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases                                                           1
  Breathing discomfort,Air hunger,Mental breathing effort,Can't finish phrases                                                                                             2
  Breathing discomfort,Air hunger,Mental breathing effort,Unplanned breaths,Can't finish phrases                                                                           1
  Breathing discomfort,Air hunger,Other                                                                                                                                    0
  Breathing discomfort,Air hunger,Unplanned breaths                                                                                                                        2
  Breathing discomfort,Breathing a lot/Unplanned breaths                                                                                                                   2
  Breathing discomfort,Breathing a lot/Unplanned breaths,Can't finish phrases                                                                                              5
  Breathing discomfort,Can't finish phrases                                                                                                                                8
  Breathing discomfort,Chest tightness                                                                                                                                     8
  Breathing discomfort,Chest tightness,Breathing a lot/Unplanned breaths                                                                                                   1
  Breathing discomfort,Chest tightness,Can't finish phrases                                                                                                                3
  Breathing discomfort,Chest tightness,Mental breathing effort                                                                                                             3
  Breathing discomfort,Chest tightness,Mental breathing effort,Breathing a lot/Unplanned breaths                                                                           0
  Breathing discomfort,Chest tightness,Unplanned breaths                                                                                                                   2
  Breathing discomfort,Chest tightness,Unplanned breaths,Can't finish phrases                                                                                              2
  Breathing discomfort,Mental breathing effort                                                                                                                             2
  Breathing discomfort,Mental breathing effort,Can't finish phrases                                                                                                        1
  Breathing discomfort,Physical breathing effort                                                                                                                           2
  Breathing discomfort,Physical breathing effort,Air hunger                                                                                                                0
  Breathing discomfort,Physical breathing effort,Air hunger,Breathing a lot/Unplanned breaths,Can't finish phrases                                                         1
  Breathing discomfort,Physical breathing effort,Air hunger,Chest tightness,Mental breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases                 1
  Breathing discomfort,Physical breathing effort,Air hunger,Chest tightness,Mental breathing effort,Can't finish phrases                                                   1
  Breathing discomfort,Physical breathing effort,Air hunger,Chest tightness,Mental breathing effort,Unplanned breaths,Can't finish phrases                                 2
  Breathing discomfort,Physical breathing effort,Air hunger,Mental breathing effort                                                                                        1
  Breathing discomfort,Physical breathing effort,Air hunger,Mental breathing effort,Unplanned breaths                                                                      0
  Breathing discomfort,Physical breathing effort,Air hunger,Mental breathing effort,Unplanned breaths,Can't finish phrases                                                 1
  Breathing discomfort,Physical breathing effort,Breathing a lot/Unplanned breaths                                                                                         1
  Breathing discomfort,Physical breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases                                                                    2
  Breathing discomfort,Physical breathing effort,Can't finish phrases                                                                                                      1
  Breathing discomfort,Physical breathing effort,Chest tightness                                                                                                           3
  Breathing discomfort,Physical breathing effort,Chest tightness,Breathing a lot/Unplanned breaths                                                                         0
  Breathing discomfort,Physical breathing effort,Chest tightness,Breathing a lot/Unplanned breaths,Can't finish phrases                                                    0
  Breathing discomfort,Physical breathing effort,Chest tightness,Can't finish phrases                                                                                      2
  Breathing discomfort,Physical breathing effort,Chest tightness,Mental breathing effort                                                                                   1
  Breathing discomfort,Physical breathing effort,Chest tightness,Mental breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases                            2
  Breathing discomfort,Physical breathing effort,Chest tightness,Mental breathing effort,Unplanned breaths,Can't finish phrases                                            1
  Breathing discomfort,Physical breathing effort,Chest tightness,Unplanned breaths                                                                                         2
  Breathing discomfort,Physical breathing effort,Chest tightness,Unplanned breaths,Can't finish phrases                                                                    1
  Breathing discomfort,Physical breathing effort,Mental breathing effort,Breathing a lot/Unplanned breaths                                                                 1
  Breathing discomfort,Physical breathing effort,Mental breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases                                            0
  Breathing discomfort,Physical breathing effort,Mental breathing effort,Can't finish phrases                                                                              2
  Breathing discomfort,Physical breathing effort,Mental breathing effort,Unplanned breaths,Can't finish phrases                                                            2
  Breathing discomfort,Physical breathing effort,Unplanned breaths                                                                                                         1
  Breathing discomfort,Unplanned breaths                                                                                                                                   1
  Breathing discomfort,Unplanned breaths,Can't finish phrases                                                                                                              1
  Breathlessness                                                                                                                                                          13
  Breathlessness,Air hunger                                                                                                                                                8
  Breathlessness,Air hunger,Breathing a lot/Unplanned breaths                                                                                                              5
  Breathlessness,Air hunger,Breathing a lot/Unplanned breaths,Can't finish phrases                                                                                        23
  Breathlessness,Air hunger,Breathing a lot/Unplanned breaths,Can't finish phrases,Other                                                                                   1
  Breathlessness,Air hunger,Can't finish phrases                                                                                                                          13
  Breathlessness,Air hunger,Can't finish phrases,Other                                                                                                                     1
  Breathlessness,Air hunger,Chest tightness                                                                                                                                3
  Breathlessness,Air hunger,Chest tightness,Breathing a lot/Unplanned breaths                                                                                              2
  Breathlessness,Air hunger,Chest tightness,Breathing a lot/Unplanned breaths,Can't finish phrases                                                                         8
  Breathlessness,Air hunger,Chest tightness,Breathing a lot/Unplanned breaths,Other                                                                                        0
  Breathlessness,Air hunger,Chest tightness,Can't finish phrases                                                                                                           4
  Breathlessness,Air hunger,Chest tightness,Mental breathing effort                                                                                                        0
  Breathlessness,Air hunger,Chest tightness,Mental breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases                                                 2
  Breathlessness,Air hunger,Chest tightness,Mental breathing effort,Can't finish phrases                                                                                   2
  Breathlessness,Air hunger,Chest tightness,Unplanned breaths                                                                                                              1
  Breathlessness,Air hunger,Chest tightness,Unplanned breaths,Can't finish phrases                                                                                         2
  Breathlessness,Air hunger,Mental breathing effort                                                                                                                        0
  Breathlessness,Air hunger,Mental breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases                                                                 8
  Breathlessness,Air hunger,Mental breathing effort,Breathing a lot/Unplanned breaths,Other                                                                                1
  Breathlessness,Air hunger,Mental breathing effort,Can't finish phrases                                                                                                   4
  Breathlessness,Air hunger,Unplanned breaths,Can't finish phrases                                                                                                         6
  Breathlessness,Breathing a lot/Unplanned breaths                                                                                                                         3
  Breathlessness,Breathing a lot/Unplanned breaths,Can't finish phrases                                                                                                    9
  Breathlessness,Breathing a lot/Unplanned breaths,Can't finish phrases,Other                                                                                              1
  Breathlessness,Breathing discomfort                                                                                                                                      4
  Breathlessness,Breathing discomfort,Air hunger,Breathing a lot/Unplanned breaths                                                                                         1
  Breathlessness,Breathing discomfort,Air hunger,Breathing a lot/Unplanned breaths,Can't finish phrases                                                                    5
  Breathlessness,Breathing discomfort,Air hunger,Can't finish phrases                                                                                                      2
  Breathlessness,Breathing discomfort,Air hunger,Chest tightness                                                                                                           4
  Breathlessness,Breathing discomfort,Air hunger,Chest tightness,Breathing a lot/Unplanned breaths                                                                         1
  Breathlessness,Breathing discomfort,Air hunger,Chest tightness,Breathing a lot/Unplanned breaths,Can't finish phrases                                                    7
  Breathlessness,Breathing discomfort,Air hunger,Chest tightness,Can't finish phrases                                                                                      2
  Breathlessness,Breathing discomfort,Air hunger,Chest tightness,Mental breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases                            3
  Breathlessness,Breathing discomfort,Air hunger,Chest tightness,Mental breathing effort,Can't finish phrases                                                              0
  Breathlessness,Breathing discomfort,Air hunger,Chest tightness,Mental breathing effort,Unplanned breaths,Can't finish phrases                                            1
  Breathlessness,Breathing discomfort,Air hunger,Chest tightness,Unplanned breaths,Can't finish phrases                                                                    4
  Breathlessness,Breathing discomfort,Air hunger,Chest tightness,Unplanned breaths,Can't finish phrases,Other                                                              1
  Breathlessness,Breathing discomfort,Air hunger,Mental breathing effort                                                                                                   1
  Breathlessness,Breathing discomfort,Air hunger,Mental breathing effort,Unplanned breaths,Can't finish phrases                                                            4
  Breathlessness,Breathing discomfort,Air hunger,Other                                                                                                                     1
  Breathlessness,Breathing discomfort,Air hunger,Unplanned breaths,Can't finish phrases                                                                                    0
  Breathlessness,Breathing discomfort,Breathing a lot/Unplanned breaths,Can't finish phrases                                                                               0
  Breathlessness,Breathing discomfort,Can't finish phrases                                                                                                                 6
  Breathlessness,Breathing discomfort,Chest tightness                                                                                                                      6
  Breathlessness,Breathing discomfort,Chest tightness,Breathing a lot/Unplanned breaths                                                                                    1
  Breathlessness,Breathing discomfort,Chest tightness,Breathing a lot/Unplanned breaths,Can't finish phrases                                                               0
  Breathlessness,Breathing discomfort,Chest tightness,Can't finish phrases                                                                                                 3
  Breathlessness,Breathing discomfort,Chest tightness,Mental breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases                                       1
  Breathlessness,Breathing discomfort,Chest tightness,Mental breathing effort,Can't finish phrases                                                                         2
  Breathlessness,Breathing discomfort,Chest tightness,Unplanned breaths                                                                                                    1
  Breathlessness,Breathing discomfort,Chest tightness,Unplanned breaths,Can't finish phrases                                                                               2
  Breathlessness,Breathing discomfort,Mental breathing effort,Breathing a lot/Unplanned breaths                                                                            1
  Breathlessness,Breathing discomfort,Mental breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases                                                       0
  Breathlessness,Breathing discomfort,Mental breathing effort,Can't finish phrases                                                                                         5
  Breathlessness,Breathing discomfort,Physical breathing effort                                                                                                            1
  Breathlessness,Breathing discomfort,Physical breathing effort,Air hunger                                                                                                 4
  Breathlessness,Breathing discomfort,Physical breathing effort,Air hunger,Breathing a lot/Unplanned breaths                                                               2
  Breathlessness,Breathing discomfort,Physical breathing effort,Air hunger,Breathing a lot/Unplanned breaths,Can't finish phrases                                          6
  Breathlessness,Breathing discomfort,Physical breathing effort,Air hunger,Breathing a lot/Unplanned breaths,Can't finish phrases,Other                                    1
  Breathlessness,Breathing discomfort,Physical breathing effort,Air hunger,Can't finish phrases                                                                            2
  Breathlessness,Breathing discomfort,Physical breathing effort,Air hunger,Chest tightness                                                                                 2
  Breathlessness,Breathing discomfort,Physical breathing effort,Air hunger,Chest tightness,Breathing a lot/Unplanned breaths                                               1
  Breathlessness,Breathing discomfort,Physical breathing effort,Air hunger,Chest tightness,Breathing a lot/Unplanned breaths,Can't finish phrases                          5
  Breathlessness,Breathing discomfort,Physical breathing effort,Air hunger,Chest tightness,Can't finish phrases                                                            5
  Breathlessness,Breathing discomfort,Physical breathing effort,Air hunger,Chest tightness,Mental breathing effort                                                         3
  Breathlessness,Breathing discomfort,Physical breathing effort,Air hunger,Chest tightness,Mental breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases 32
  Breathlessness,Breathing discomfort,Physical breathing effort,Air hunger,Chest tightness,Mental breathing effort,Can't finish phrases                                    2
  Breathlessness,Breathing discomfort,Physical breathing effort,Air hunger,Chest tightness,Mental breathing effort,Unplanned breaths,Can't finish phrases                 35
  Breathlessness,Breathing discomfort,Physical breathing effort,Air hunger,Chest tightness,Unplanned breaths,Can't finish phrases                                          0
  Breathlessness,Breathing discomfort,Physical breathing effort,Air hunger,Mental breathing effort,Breathing a lot/Unplanned breaths                                       0
  Breathlessness,Breathing discomfort,Physical breathing effort,Air hunger,Mental breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases                  9
  Breathlessness,Breathing discomfort,Physical breathing effort,Air hunger,Mental breathing effort,Can't finish phrases                                                    0
  Breathlessness,Breathing discomfort,Physical breathing effort,Air hunger,Mental breathing effort,Unplanned breaths,Can't finish phrases                                  5
  Breathlessness,Breathing discomfort,Physical breathing effort,Air hunger,Unplanned breaths,Can't finish phrases                                                          1
  Breathlessness,Breathing discomfort,Physical breathing effort,Breathing a lot/Unplanned breaths                                                                          1
  Breathlessness,Breathing discomfort,Physical breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases                                                     5
  Breathlessness,Breathing discomfort,Physical breathing effort,Can't finish phrases                                                                                       0
  Breathlessness,Breathing discomfort,Physical breathing effort,Chest tightness                                                                                            1
  Breathlessness,Breathing discomfort,Physical breathing effort,Chest tightness,Breathing a lot/Unplanned breaths,Can't finish phrases                                     2
  Breathlessness,Breathing discomfort,Physical breathing effort,Chest tightness,Mental breathing effort                                                                    0
  Breathlessness,Breathing discomfort,Physical breathing effort,Chest tightness,Mental breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases             1
  Breathlessness,Breathing discomfort,Physical breathing effort,Chest tightness,Mental breathing effort,Can't finish phrases                                               2
  Breathlessness,Breathing discomfort,Physical breathing effort,Chest tightness,Mental breathing effort,Unplanned breaths,Can't finish phrases                             2
  Breathlessness,Breathing discomfort,Physical breathing effort,Mental breathing effort                                                                                    1
  Breathlessness,Breathing discomfort,Physical breathing effort,Mental breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases                             0
  Breathlessness,Breathing discomfort,Physical breathing effort,Mental breathing effort,Can't finish phrases                                                               1
  Breathlessness,Breathing discomfort,Physical breathing effort,Unplanned breaths                                                                                          2
  Breathlessness,Breathing discomfort,Physical breathing effort,Unplanned breaths,Can't finish phrases                                                                     2
  Breathlessness,Breathing discomfort,Unplanned breaths,Can't finish phrases                                                                                               2
  Breathlessness,Can't finish phrases                                                                                                                                     20
  Breathlessness,Can't finish phrases,Other                                                                                                                                1
  Breathlessness,Chest tightness                                                                                                                                           5
  Breathlessness,Chest tightness,Breathing a lot/Unplanned breaths                                                                                                         1
  Breathlessness,Chest tightness,Breathing a lot/Unplanned breaths,Can't finish phrases                                                                                    1
  Breathlessness,Chest tightness,Can't finish phrases                                                                                                                      7
  Breathlessness,Chest tightness,Mental breathing effort                                                                                                                   0
  Breathlessness,Chest tightness,Unplanned breaths,Can't finish phrases                                                                                                    2
  Breathlessness,Mental breathing effort                                                                                                                                   1
  Breathlessness,Mental breathing effort,Breathing a lot/Unplanned breaths                                                                                                 1
  Breathlessness,Mental breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases                                                                            1
  Breathlessness,Mental breathing effort,Can't finish phrases                                                                                                              3
  Breathlessness,Mental breathing effort,Unplanned breaths                                                                                                                 1
  Breathlessness,Mental breathing effort,Unplanned breaths,Can't finish phrases                                                                                            1
  Breathlessness,Other                                                                                                                                                     0
  Breathlessness,Physical breathing effort                                                                                                                                 4
  Breathlessness,Physical breathing effort,Air hunger                                                                                                                      2
  Breathlessness,Physical breathing effort,Air hunger,Breathing a lot/Unplanned breaths                                                                                    1
  Breathlessness,Physical breathing effort,Air hunger,Breathing a lot/Unplanned breaths,Can't finish phrases                                                               7
  Breathlessness,Physical breathing effort,Air hunger,Can't finish phrases                                                                                                 2
  Breathlessness,Physical breathing effort,Air hunger,Chest tightness                                                                                                      1
  Breathlessness,Physical breathing effort,Air hunger,Chest tightness,Breathing a lot/Unplanned breaths,Can't finish phrases                                               6
  Breathlessness,Physical breathing effort,Air hunger,Chest tightness,Breathing a lot/Unplanned breaths,Can't finish phrases,Other                                         1
  Breathlessness,Physical breathing effort,Air hunger,Chest tightness,Mental breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases                       3
  Breathlessness,Physical breathing effort,Air hunger,Chest tightness,Mental breathing effort,Can't finish phrases                                                         1
  Breathlessness,Physical breathing effort,Air hunger,Chest tightness,Mental breathing effort,Unplanned breaths,Can't finish phrases                                       3
  Breathlessness,Physical breathing effort,Air hunger,Chest tightness,Unplanned breaths                                                                                    1
  Breathlessness,Physical breathing effort,Air hunger,Chest tightness,Unplanned breaths,Can't finish phrases                                                               3
  Breathlessness,Physical breathing effort,Air hunger,Mental breathing effort                                                                                              1
  Breathlessness,Physical breathing effort,Air hunger,Mental breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases                                       2
  Breathlessness,Physical breathing effort,Air hunger,Mental breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases,Other                                 1
  Breathlessness,Physical breathing effort,Air hunger,Mental breathing effort,Can't finish phrases                                                                         3
  Breathlessness,Physical breathing effort,Air hunger,Mental breathing effort,Unplanned breaths,Can't finish phrases                                                       2
  Breathlessness,Physical breathing effort,Air hunger,Mental breathing effort,Unplanned breaths,Can't finish phrases,Other                                                 1
  Breathlessness,Physical breathing effort,Air hunger,Unplanned breaths,Can't finish phrases                                                                               4
  Breathlessness,Physical breathing effort,Breathing a lot/Unplanned breaths                                                                                               1
  Breathlessness,Physical breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases                                                                          7
  Breathlessness,Physical breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases,Other                                                                    1
  Breathlessness,Physical breathing effort,Can't finish phrases                                                                                                            6
  Breathlessness,Physical breathing effort,Chest tightness                                                                                                                 1
  Breathlessness,Physical breathing effort,Chest tightness,Breathing a lot/Unplanned breaths,Can't finish phrases                                                          1
  Breathlessness,Physical breathing effort,Chest tightness,Can't finish phrases                                                                                            2
  Breathlessness,Physical breathing effort,Chest tightness,Mental breathing effort                                                                                         1
  Breathlessness,Physical breathing effort,Chest tightness,Mental breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases                                  2
  Breathlessness,Physical breathing effort,Chest tightness,Unplanned breaths,Can't finish phrases                                                                          1
  Breathlessness,Physical breathing effort,Mental breathing effort,Breathing a lot/Unplanned breaths                                                                       2
  Breathlessness,Physical breathing effort,Mental breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases                                                  5
  Breathlessness,Physical breathing effort,Mental breathing effort,Can't finish phrases                                                                                    3
  Breathlessness,Physical breathing effort,Mental breathing effort,Unplanned breaths                                                                                       0
  Breathlessness,Physical breathing effort,Mental breathing effort,Unplanned breaths,Can't finish phrases                                                                  2
  Breathlessness,Physical breathing effort,Unplanned breaths,Can't finish phrases                                                                                          2
  Breathlessness,Unplanned breaths                                                                                                                                         1
  Breathlessness,Unplanned breaths,Can't finish phrases                                                                                                                    9
  Can't finish phrases                                                                                                                                                    79
  Can't finish phrases,Breathing discomfort                                                                                                                                1
  Can't finish phrases,Mental breathing effort                                                                                                                             1
  Can't finish phrases,Other                                                                                                                                               2
  Can't finish phrases,Unplanned breaths                                                                                                                                   1
  Chest tightness                                                                                                                                                         10
  Chest tightness,Breathing a lot/Unplanned breaths                                                                                                                        2
  Chest tightness,Breathing a lot/Unplanned breaths,Can't finish phrases                                                                                                   0
  Chest tightness,Can't finish phrases                                                                                                                                     5
  Chest tightness,Mental breathing effort                                                                                                                                  1
  Chest tightness,Mental breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases                                                                           1
  Chest tightness,Mental breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases,Other                                                                     1
  Chest tightness,Mental breathing effort,Can't finish phrases                                                                                                             1
  Chest tightness,Other                                                                                                                                                    1
  Chest tightness,Unplanned breaths                                                                                                                                        2
  Mental breathing effort                                                                                                                                                  8
  Mental breathing effort,Breathing a lot/Unplanned breaths                                                                                                                2
  Mental breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases                                                                                           5
  Mental breathing effort,Can't finish phrases                                                                                                                            12
  Mental breathing effort,Can't finish phrases,Other                                                                                                                       1
  Mental breathing effort,Other                                                                                                                                            1
  Mental breathing effort,Unplanned breaths,Can't finish phrases                                                                                                           3
  Misc/Unclear                                                                                                                                                             1
  None of the above                                                                                                                                                        1
  Other                                                                                                                                                                    0
  Physical breathing effort                                                                                                                                               18
  Physical breathing effort,Air hunger                                                                                                                                     8
  Physical breathing effort,Air hunger,Breathing a lot/Unplanned breaths                                                                                                   1
  Physical breathing effort,Air hunger,Breathing a lot/Unplanned breaths,Can't finish phrases                                                                              2
  Physical breathing effort,Air hunger,Can't finish phrases                                                                                                               12
  Physical breathing effort,Air hunger,Chest tightness                                                                                                                     1
  Physical breathing effort,Air hunger,Chest tightness,Can't finish phrases                                                                                                5
  Physical breathing effort,Air hunger,Chest tightness,Mental breathing effort                                                                                             1
  Physical breathing effort,Air hunger,Chest tightness,Mental breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases                                      1
  Physical breathing effort,Air hunger,Chest tightness,Mental breathing effort,Can't finish phrases                                                                        1
  Physical breathing effort,Air hunger,Mental breathing effort                                                                                                             4
  Physical breathing effort,Air hunger,Mental breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases                                                      3
  Physical breathing effort,Air hunger,Mental breathing effort,Can't finish phrases                                                                                        3
  Physical breathing effort,Air hunger,Mental breathing effort,Unplanned breaths,Can't finish phrases                                                                      6
  Physical breathing effort,Air hunger,Unplanned breaths                                                                                                                   0
  Physical breathing effort,Air hunger,Unplanned breaths,Can't finish phrases                                                                                              3
  Physical breathing effort,Breathing a lot/Unplanned breaths                                                                                                              1
  Physical breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases                                                                                         3
  Physical breathing effort,Breathing a lot/Unplanned breaths,Other                                                                                                        0
  Physical breathing effort,Can't finish phrases                                                                                                                          11
  Physical breathing effort,Can't finish phrases,Other                                                                                                                     1
  Physical breathing effort,Chest tightness                                                                                                                                4
  Physical breathing effort,Chest tightness,Breathing a lot/Unplanned breaths                                                                                              1
  Physical breathing effort,Chest tightness,Breathing a lot/Unplanned breaths,Can't finish phrases                                                                         0
  Physical breathing effort,Chest tightness,Can't finish phrases                                                                                                           2
  Physical breathing effort,Chest tightness,Mental breathing effort                                                                                                        1
  Physical breathing effort,Chest tightness,Mental breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases                                                 2
  Physical breathing effort,Chest tightness,Mental breathing effort,Can't finish phrases                                                                                   2
  Physical breathing effort,Chest tightness,Unplanned breaths                                                                                                              0
  Physical breathing effort,Chest tightness,Unplanned breaths,Can't finish phrases                                                                                         1
  Physical breathing effort,Mental breathing effort                                                                                                                        6
  Physical breathing effort,Mental breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases                                                                 6
  Physical breathing effort,Mental breathing effort,Can't finish phrases                                                                                                   7
  Physical breathing effort,Mental breathing effort,Other                                                                                                                  1
  Physical breathing effort,Mental breathing effort,Unplanned breaths                                                                                                      1
  Physical breathing effort,Mental breathing effort,Unplanned breaths,Can't finish phrases                                                                                 0
  Physical breathing effort,Other                                                                                                                                          3
  Physical breathing effort,Unplanned breaths,Can't finish phrases                                                                                                         2
  Physical breathing effort,Unplanned breaths,Can't finish phrases,Other                                                                                                   0
  Unplanned breaths                                                                                                                                                        2
  Unplanned breaths,Can't finish phrases                                                                                                                                  23

Contingency Table (Row Percentages):
                                                                                                                                                                         
                                                                                                                                                                               0
  Air hunger                                                                                                                                                               54.84
  Air hunger,Breathing a lot/Unplanned breaths                                                                                                                              0.00
  Air hunger,Breathing a lot/Unplanned breaths,Can't finish phrases                                                                                                        34.48
  Air hunger,Can't finish phrases                                                                                                                                          29.41
  Air hunger,Can't finish phrases,Other                                                                                                                                    50.00
  Air hunger,Chest tightness                                                                                                                                               33.33
  Air hunger,Chest tightness,Breathing a lot/Unplanned breaths                                                                                                            100.00
  Air hunger,Chest tightness,Breathing a lot/Unplanned breaths,Can't finish phrases                                                                                         0.00
  Air hunger,Chest tightness,Can't finish phrases                                                                                                                          57.14
  Air hunger,Chest tightness,Mental breathing effort                                                                                                                        0.00
  Air hunger,Chest tightness,Mental breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases                                                                 0.00
  Air hunger,Chest tightness,Mental breathing effort,Unplanned breaths                                                                                                      0.00
  Air hunger,Chest tightness,Unplanned breaths                                                                                                                              0.00
  Air hunger,Chest tightness,Unplanned breaths,Can't finish phrases                                                                                                         0.00
  Air hunger,Mental breathing effort                                                                                                                                       33.33
  Air hunger,Mental breathing effort,Breathing a lot/Unplanned breaths                                                                                                      0.00
  Air hunger,Mental breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases                                                                                10.00
  Air hunger,Mental breathing effort,Can't finish phrases                                                                                                                  18.18
  Air hunger,Mental breathing effort,Unplanned breaths                                                                                                                      0.00
  Air hunger,Unplanned breaths                                                                                                                                             33.33
  Air hunger,Unplanned breaths,Can't finish phrases                                                                                                                        33.33
  Breathing a lot/Unplanned breaths                                                                                                                                        45.45
  Breathing a lot/Unplanned breaths,Can't finish phrases                                                                                                                   40.48
  Breathing a lot/Unplanned breaths,Other                                                                                                                                 100.00
  Breathing discomfort                                                                                                                                                     57.89
  Breathing discomfort,Air hunger                                                                                                                                         100.00
  Breathing discomfort,Air hunger,Breathing a lot/Unplanned breaths                                                                                                         0.00
  Breathing discomfort,Air hunger,Breathing a lot/Unplanned breaths,Can't finish phrases                                                                                   50.00
  Breathing discomfort,Air hunger,Can't finish phrases                                                                                                                     20.00
  Breathing discomfort,Air hunger,Chest tightness                                                                                                                           0.00
  Breathing discomfort,Air hunger,Chest tightness,Breathing a lot/Unplanned breaths                                                                                         0.00
  Breathing discomfort,Air hunger,Chest tightness,Breathing a lot/Unplanned breaths,Can't finish phrases                                                                    0.00
  Breathing discomfort,Air hunger,Chest tightness,Can't finish phrases                                                                                                      0.00
  Breathing discomfort,Air hunger,Chest tightness,Mental breathing effort                                                                                                   0.00
  Breathing discomfort,Air hunger,Chest tightness,Mental breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases                                           50.00
  Breathing discomfort,Air hunger,Chest tightness,Mental breathing effort,Can't finish phrases                                                                              0.00
  Breathing discomfort,Air hunger,Mental breathing effort                                                                                                                   0.00
  Breathing discomfort,Air hunger,Mental breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases                                                            0.00
  Breathing discomfort,Air hunger,Mental breathing effort,Can't finish phrases                                                                                              0.00
  Breathing discomfort,Air hunger,Mental breathing effort,Unplanned breaths,Can't finish phrases                                                                            0.00
  Breathing discomfort,Air hunger,Other                                                                                                                                   100.00
  Breathing discomfort,Air hunger,Unplanned breaths                                                                                                                         0.00
  Breathing discomfort,Breathing a lot/Unplanned breaths                                                                                                                   33.33
  Breathing discomfort,Breathing a lot/Unplanned breaths,Can't finish phrases                                                                                               0.00
  Breathing discomfort,Can't finish phrases                                                                                                                                20.00
  Breathing discomfort,Chest tightness                                                                                                                                     20.00
  Breathing discomfort,Chest tightness,Breathing a lot/Unplanned breaths                                                                                                    0.00
  Breathing discomfort,Chest tightness,Can't finish phrases                                                                                                                40.00
  Breathing discomfort,Chest tightness,Mental breathing effort                                                                                                             25.00
  Breathing discomfort,Chest tightness,Mental breathing effort,Breathing a lot/Unplanned breaths                                                                          100.00
  Breathing discomfort,Chest tightness,Unplanned breaths                                                                                                                   33.33
  Breathing discomfort,Chest tightness,Unplanned breaths,Can't finish phrases                                                                                               0.00
  Breathing discomfort,Mental breathing effort                                                                                                                              0.00
  Breathing discomfort,Mental breathing effort,Can't finish phrases                                                                                                         0.00
  Breathing discomfort,Physical breathing effort                                                                                                                           50.00
  Breathing discomfort,Physical breathing effort,Air hunger                                                                                                               100.00
  Breathing discomfort,Physical breathing effort,Air hunger,Breathing a lot/Unplanned breaths,Can't finish phrases                                                         66.67
  Breathing discomfort,Physical breathing effort,Air hunger,Chest tightness,Mental breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases                 50.00
  Breathing discomfort,Physical breathing effort,Air hunger,Chest tightness,Mental breathing effort,Can't finish phrases                                                    0.00
  Breathing discomfort,Physical breathing effort,Air hunger,Chest tightness,Mental breathing effort,Unplanned breaths,Can't finish phrases                                  0.00
  Breathing discomfort,Physical breathing effort,Air hunger,Mental breathing effort                                                                                         0.00
  Breathing discomfort,Physical breathing effort,Air hunger,Mental breathing effort,Unplanned breaths                                                                     100.00
  Breathing discomfort,Physical breathing effort,Air hunger,Mental breathing effort,Unplanned breaths,Can't finish phrases                                                  0.00
  Breathing discomfort,Physical breathing effort,Breathing a lot/Unplanned breaths                                                                                          0.00
  Breathing discomfort,Physical breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases                                                                     0.00
  Breathing discomfort,Physical breathing effort,Can't finish phrases                                                                                                      66.67
  Breathing discomfort,Physical breathing effort,Chest tightness                                                                                                            0.00
  Breathing discomfort,Physical breathing effort,Chest tightness,Breathing a lot/Unplanned breaths                                                                        100.00
  Breathing discomfort,Physical breathing effort,Chest tightness,Breathing a lot/Unplanned breaths,Can't finish phrases                                                   100.00
  Breathing discomfort,Physical breathing effort,Chest tightness,Can't finish phrases                                                                                       0.00
  Breathing discomfort,Physical breathing effort,Chest tightness,Mental breathing effort                                                                                    0.00
  Breathing discomfort,Physical breathing effort,Chest tightness,Mental breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases                             0.00
  Breathing discomfort,Physical breathing effort,Chest tightness,Mental breathing effort,Unplanned breaths,Can't finish phrases                                             0.00
  Breathing discomfort,Physical breathing effort,Chest tightness,Unplanned breaths                                                                                          0.00
  Breathing discomfort,Physical breathing effort,Chest tightness,Unplanned breaths,Can't finish phrases                                                                     0.00
  Breathing discomfort,Physical breathing effort,Mental breathing effort,Breathing a lot/Unplanned breaths                                                                 50.00
  Breathing discomfort,Physical breathing effort,Mental breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases                                           100.00
  Breathing discomfort,Physical breathing effort,Mental breathing effort,Can't finish phrases                                                                              33.33
  Breathing discomfort,Physical breathing effort,Mental breathing effort,Unplanned breaths,Can't finish phrases                                                             0.00
  Breathing discomfort,Physical breathing effort,Unplanned breaths                                                                                                          0.00
  Breathing discomfort,Unplanned breaths                                                                                                                                   50.00
  Breathing discomfort,Unplanned breaths,Can't finish phrases                                                                                                               0.00
  Breathlessness                                                                                                                                                           50.00
  Breathlessness,Air hunger                                                                                                                                                27.27
  Breathlessness,Air hunger,Breathing a lot/Unplanned breaths                                                                                                               0.00
  Breathlessness,Air hunger,Breathing a lot/Unplanned breaths,Can't finish phrases                                                                                         28.12
  Breathlessness,Air hunger,Breathing a lot/Unplanned breaths,Can't finish phrases,Other                                                                                    0.00
  Breathlessness,Air hunger,Can't finish phrases                                                                                                                           18.75
  Breathlessness,Air hunger,Can't finish phrases,Other                                                                                                                      0.00
  Breathlessness,Air hunger,Chest tightness                                                                                                                                25.00
  Breathlessness,Air hunger,Chest tightness,Breathing a lot/Unplanned breaths                                                                                               0.00
  Breathlessness,Air hunger,Chest tightness,Breathing a lot/Unplanned breaths,Can't finish phrases                                                                         20.00
  Breathlessness,Air hunger,Chest tightness,Breathing a lot/Unplanned breaths,Other                                                                                       100.00
  Breathlessness,Air hunger,Chest tightness,Can't finish phrases                                                                                                            0.00
  Breathlessness,Air hunger,Chest tightness,Mental breathing effort                                                                                                       100.00
  Breathlessness,Air hunger,Chest tightness,Mental breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases                                                 33.33
  Breathlessness,Air hunger,Chest tightness,Mental breathing effort,Can't finish phrases                                                                                    0.00
  Breathlessness,Air hunger,Chest tightness,Unplanned breaths                                                                                                               0.00
  Breathlessness,Air hunger,Chest tightness,Unplanned breaths,Can't finish phrases                                                                                         33.33
  Breathlessness,Air hunger,Mental breathing effort                                                                                                                       100.00
  Breathlessness,Air hunger,Mental breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases                                                                 20.00
  Breathlessness,Air hunger,Mental breathing effort,Breathing a lot/Unplanned breaths,Other                                                                                 0.00
  Breathlessness,Air hunger,Mental breathing effort,Can't finish phrases                                                                                                   20.00
  Breathlessness,Air hunger,Unplanned breaths,Can't finish phrases                                                                                                         14.29
  Breathlessness,Breathing a lot/Unplanned breaths                                                                                                                         50.00
  Breathlessness,Breathing a lot/Unplanned breaths,Can't finish phrases                                                                                                    43.75
  Breathlessness,Breathing a lot/Unplanned breaths,Can't finish phrases,Other                                                                                              50.00
  Breathlessness,Breathing discomfort                                                                                                                                      50.00
  Breathlessness,Breathing discomfort,Air hunger,Breathing a lot/Unplanned breaths                                                                                         50.00
  Breathlessness,Breathing discomfort,Air hunger,Breathing a lot/Unplanned breaths,Can't finish phrases                                                                    28.57
  Breathlessness,Breathing discomfort,Air hunger,Can't finish phrases                                                                                                      33.33
  Breathlessness,Breathing discomfort,Air hunger,Chest tightness                                                                                                           20.00
  Breathlessness,Breathing discomfort,Air hunger,Chest tightness,Breathing a lot/Unplanned breaths                                                                         50.00
  Breathlessness,Breathing discomfort,Air hunger,Chest tightness,Breathing a lot/Unplanned breaths,Can't finish phrases                                                    36.36
  Breathlessness,Breathing discomfort,Air hunger,Chest tightness,Can't finish phrases                                                                                       0.00
  Breathlessness,Breathing discomfort,Air hunger,Chest tightness,Mental breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases                             0.00
  Breathlessness,Breathing discomfort,Air hunger,Chest tightness,Mental breathing effort,Can't finish phrases                                                             100.00
  Breathlessness,Breathing discomfort,Air hunger,Chest tightness,Mental breathing effort,Unplanned breaths,Can't finish phrases                                             0.00
  Breathlessness,Breathing discomfort,Air hunger,Chest tightness,Unplanned breaths,Can't finish phrases                                                                     0.00
  Breathlessness,Breathing discomfort,Air hunger,Chest tightness,Unplanned breaths,Can't finish phrases,Other                                                               0.00
  Breathlessness,Breathing discomfort,Air hunger,Mental breathing effort                                                                                                    0.00
  Breathlessness,Breathing discomfort,Air hunger,Mental breathing effort,Unplanned breaths,Can't finish phrases                                                             0.00
  Breathlessness,Breathing discomfort,Air hunger,Other                                                                                                                      0.00
  Breathlessness,Breathing discomfort,Air hunger,Unplanned breaths,Can't finish phrases                                                                                   100.00
  Breathlessness,Breathing discomfort,Breathing a lot/Unplanned breaths,Can't finish phrases                                                                              100.00
  Breathlessness,Breathing discomfort,Can't finish phrases                                                                                                                 25.00
  Breathlessness,Breathing discomfort,Chest tightness                                                                                                                      14.29
  Breathlessness,Breathing discomfort,Chest tightness,Breathing a lot/Unplanned breaths                                                                                     0.00
  Breathlessness,Breathing discomfort,Chest tightness,Breathing a lot/Unplanned breaths,Can't finish phrases                                                              100.00
  Breathlessness,Breathing discomfort,Chest tightness,Can't finish phrases                                                                                                 40.00
  Breathlessness,Breathing discomfort,Chest tightness,Mental breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases                                        0.00
  Breathlessness,Breathing discomfort,Chest tightness,Mental breathing effort,Can't finish phrases                                                                          0.00
  Breathlessness,Breathing discomfort,Chest tightness,Unplanned breaths                                                                                                     0.00
  Breathlessness,Breathing discomfort,Chest tightness,Unplanned breaths,Can't finish phrases                                                                                0.00
  Breathlessness,Breathing discomfort,Mental breathing effort,Breathing a lot/Unplanned breaths                                                                             0.00
  Breathlessness,Breathing discomfort,Mental breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases                                                      100.00
  Breathlessness,Breathing discomfort,Mental breathing effort,Can't finish phrases                                                                                          0.00
  Breathlessness,Breathing discomfort,Physical breathing effort                                                                                                             0.00
  Breathlessness,Breathing discomfort,Physical breathing effort,Air hunger                                                                                                  0.00
  Breathlessness,Breathing discomfort,Physical breathing effort,Air hunger,Breathing a lot/Unplanned breaths                                                                0.00
  Breathlessness,Breathing discomfort,Physical breathing effort,Air hunger,Breathing a lot/Unplanned breaths,Can't finish phrases                                          14.29
  Breathlessness,Breathing discomfort,Physical breathing effort,Air hunger,Breathing a lot/Unplanned breaths,Can't finish phrases,Other                                     0.00
  Breathlessness,Breathing discomfort,Physical breathing effort,Air hunger,Can't finish phrases                                                                             0.00
  Breathlessness,Breathing discomfort,Physical breathing effort,Air hunger,Chest tightness                                                                                  0.00
  Breathlessness,Breathing discomfort,Physical breathing effort,Air hunger,Chest tightness,Breathing a lot/Unplanned breaths                                                0.00
  Breathlessness,Breathing discomfort,Physical breathing effort,Air hunger,Chest tightness,Breathing a lot/Unplanned breaths,Can't finish phrases                           0.00
  Breathlessness,Breathing discomfort,Physical breathing effort,Air hunger,Chest tightness,Can't finish phrases                                                            28.57
  Breathlessness,Breathing discomfort,Physical breathing effort,Air hunger,Chest tightness,Mental breathing effort                                                          0.00
  Breathlessness,Breathing discomfort,Physical breathing effort,Air hunger,Chest tightness,Mental breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases  11.11
  Breathlessness,Breathing discomfort,Physical breathing effort,Air hunger,Chest tightness,Mental breathing effort,Can't finish phrases                                    33.33
  Breathlessness,Breathing discomfort,Physical breathing effort,Air hunger,Chest tightness,Mental breathing effort,Unplanned breaths,Can't finish phrases                   0.00
  Breathlessness,Breathing discomfort,Physical breathing effort,Air hunger,Chest tightness,Unplanned breaths,Can't finish phrases                                         100.00
  Breathlessness,Breathing discomfort,Physical breathing effort,Air hunger,Mental breathing effort,Breathing a lot/Unplanned breaths                                      100.00
  Breathlessness,Breathing discomfort,Physical breathing effort,Air hunger,Mental breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases                  25.00
  Breathlessness,Breathing discomfort,Physical breathing effort,Air hunger,Mental breathing effort,Can't finish phrases                                                   100.00
  Breathlessness,Breathing discomfort,Physical breathing effort,Air hunger,Mental breathing effort,Unplanned breaths,Can't finish phrases                                   0.00
  Breathlessness,Breathing discomfort,Physical breathing effort,Air hunger,Unplanned breaths,Can't finish phrases                                                          50.00
  Breathlessness,Breathing discomfort,Physical breathing effort,Breathing a lot/Unplanned breaths                                                                           0.00
  Breathlessness,Breathing discomfort,Physical breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases                                                     16.67
  Breathlessness,Breathing discomfort,Physical breathing effort,Can't finish phrases                                                                                      100.00
  Breathlessness,Breathing discomfort,Physical breathing effort,Chest tightness                                                                                             0.00
  Breathlessness,Breathing discomfort,Physical breathing effort,Chest tightness,Breathing a lot/Unplanned breaths,Can't finish phrases                                     33.33
  Breathlessness,Breathing discomfort,Physical breathing effort,Chest tightness,Mental breathing effort                                                                   100.00
  Breathlessness,Breathing discomfort,Physical breathing effort,Chest tightness,Mental breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases              0.00
  Breathlessness,Breathing discomfort,Physical breathing effort,Chest tightness,Mental breathing effort,Can't finish phrases                                               33.33
  Breathlessness,Breathing discomfort,Physical breathing effort,Chest tightness,Mental breathing effort,Unplanned breaths,Can't finish phrases                              0.00
  Breathlessness,Breathing discomfort,Physical breathing effort,Mental breathing effort                                                                                     0.00
  Breathlessness,Breathing discomfort,Physical breathing effort,Mental breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases                            100.00
  Breathlessness,Breathing discomfort,Physical breathing effort,Mental breathing effort,Can't finish phrases                                                                0.00
  Breathlessness,Breathing discomfort,Physical breathing effort,Unplanned breaths                                                                                           0.00
  Breathlessness,Breathing discomfort,Physical breathing effort,Unplanned breaths,Can't finish phrases                                                                      0.00
  Breathlessness,Breathing discomfort,Unplanned breaths,Can't finish phrases                                                                                                0.00
  Breathlessness,Can't finish phrases                                                                                                                                      33.33
  Breathlessness,Can't finish phrases,Other                                                                                                                                50.00
  Breathlessness,Chest tightness                                                                                                                                           16.67
  Breathlessness,Chest tightness,Breathing a lot/Unplanned breaths                                                                                                         50.00
  Breathlessness,Chest tightness,Breathing a lot/Unplanned breaths,Can't finish phrases                                                                                    50.00
  Breathlessness,Chest tightness,Can't finish phrases                                                                                                                      46.15
  Breathlessness,Chest tightness,Mental breathing effort                                                                                                                  100.00
  Breathlessness,Chest tightness,Unplanned breaths,Can't finish phrases                                                                                                    33.33
  Breathlessness,Mental breathing effort                                                                                                                                    0.00
  Breathlessness,Mental breathing effort,Breathing a lot/Unplanned breaths                                                                                                 50.00
  Breathlessness,Mental breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases                                                                             0.00
  Breathlessness,Mental breathing effort,Can't finish phrases                                                                                                              50.00
  Breathlessness,Mental breathing effort,Unplanned breaths                                                                                                                  0.00
  Breathlessness,Mental breathing effort,Unplanned breaths,Can't finish phrases                                                                                             0.00
  Breathlessness,Other                                                                                                                                                    100.00
  Breathlessness,Physical breathing effort                                                                                                                                 42.86
  Breathlessness,Physical breathing effort,Air hunger                                                                                                                       0.00
  Breathlessness,Physical breathing effort,Air hunger,Breathing a lot/Unplanned breaths                                                                                     0.00
  Breathlessness,Physical breathing effort,Air hunger,Breathing a lot/Unplanned breaths,Can't finish phrases                                                               12.50
  Breathlessness,Physical breathing effort,Air hunger,Can't finish phrases                                                                                                 66.67
  Breathlessness,Physical breathing effort,Air hunger,Chest tightness                                                                                                       0.00
  Breathlessness,Physical breathing effort,Air hunger,Chest tightness,Breathing a lot/Unplanned breaths,Can't finish phrases                                               14.29
  Breathlessness,Physical breathing effort,Air hunger,Chest tightness,Breathing a lot/Unplanned breaths,Can't finish phrases,Other                                          0.00
  Breathlessness,Physical breathing effort,Air hunger,Chest tightness,Mental breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases                       50.00
  Breathlessness,Physical breathing effort,Air hunger,Chest tightness,Mental breathing effort,Can't finish phrases                                                          0.00
  Breathlessness,Physical breathing effort,Air hunger,Chest tightness,Mental breathing effort,Unplanned breaths,Can't finish phrases                                        0.00
  Breathlessness,Physical breathing effort,Air hunger,Chest tightness,Unplanned breaths                                                                                     0.00
  Breathlessness,Physical breathing effort,Air hunger,Chest tightness,Unplanned breaths,Can't finish phrases                                                                0.00
  Breathlessness,Physical breathing effort,Air hunger,Mental breathing effort                                                                                               0.00
  Breathlessness,Physical breathing effort,Air hunger,Mental breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases                                       50.00
  Breathlessness,Physical breathing effort,Air hunger,Mental breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases,Other                                  0.00
  Breathlessness,Physical breathing effort,Air hunger,Mental breathing effort,Can't finish phrases                                                                         25.00
  Breathlessness,Physical breathing effort,Air hunger,Mental breathing effort,Unplanned breaths,Can't finish phrases                                                       33.33
  Breathlessness,Physical breathing effort,Air hunger,Mental breathing effort,Unplanned breaths,Can't finish phrases,Other                                                  0.00
  Breathlessness,Physical breathing effort,Air hunger,Unplanned breaths,Can't finish phrases                                                                                0.00
  Breathlessness,Physical breathing effort,Breathing a lot/Unplanned breaths                                                                                                0.00
  Breathlessness,Physical breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases                                                                          12.50
  Breathlessness,Physical breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases,Other                                                                    50.00
  Breathlessness,Physical breathing effort,Can't finish phrases                                                                                                             0.00
  Breathlessness,Physical breathing effort,Chest tightness                                                                                                                 75.00
  Breathlessness,Physical breathing effort,Chest tightness,Breathing a lot/Unplanned breaths,Can't finish phrases                                                          50.00
  Breathlessness,Physical breathing effort,Chest tightness,Can't finish phrases                                                                                             0.00
  Breathlessness,Physical breathing effort,Chest tightness,Mental breathing effort                                                                                          0.00
  Breathlessness,Physical breathing effort,Chest tightness,Mental breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases                                   0.00
  Breathlessness,Physical breathing effort,Chest tightness,Unplanned breaths,Can't finish phrases                                                                           0.00
  Breathlessness,Physical breathing effort,Mental breathing effort,Breathing a lot/Unplanned breaths                                                                        0.00
  Breathlessness,Physical breathing effort,Mental breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases                                                   0.00
  Breathlessness,Physical breathing effort,Mental breathing effort,Can't finish phrases                                                                                    25.00
  Breathlessness,Physical breathing effort,Mental breathing effort,Unplanned breaths                                                                                      100.00
  Breathlessness,Physical breathing effort,Mental breathing effort,Unplanned breaths,Can't finish phrases                                                                   0.00
  Breathlessness,Physical breathing effort,Unplanned breaths,Can't finish phrases                                                                                          33.33
  Breathlessness,Unplanned breaths                                                                                                                                          0.00
  Breathlessness,Unplanned breaths,Can't finish phrases                                                                                                                    18.18
  Can't finish phrases                                                                                                                                                     28.18
  Can't finish phrases,Breathing discomfort                                                                                                                                 0.00
  Can't finish phrases,Mental breathing effort                                                                                                                              0.00
  Can't finish phrases,Other                                                                                                                                               33.33
  Can't finish phrases,Unplanned breaths                                                                                                                                    0.00
  Chest tightness                                                                                                                                                          52.38
  Chest tightness,Breathing a lot/Unplanned breaths                                                                                                                         0.00
  Chest tightness,Breathing a lot/Unplanned breaths,Can't finish phrases                                                                                                  100.00
  Chest tightness,Can't finish phrases                                                                                                                                     16.67
  Chest tightness,Mental breathing effort                                                                                                                                   0.00
  Chest tightness,Mental breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases                                                                            0.00
  Chest tightness,Mental breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases,Other                                                                      0.00
  Chest tightness,Mental breathing effort,Can't finish phrases                                                                                                              0.00
  Chest tightness,Other                                                                                                                                                     0.00
  Chest tightness,Unplanned breaths                                                                                                                                        33.33
  Mental breathing effort                                                                                                                                                  52.94
  Mental breathing effort,Breathing a lot/Unplanned breaths                                                                                                                 0.00
  Mental breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases                                                                                           16.67
  Mental breathing effort,Can't finish phrases                                                                                                                             14.29
  Mental breathing effort,Can't finish phrases,Other                                                                                                                       50.00
  Mental breathing effort,Other                                                                                                                                             0.00
  Mental breathing effort,Unplanned breaths,Can't finish phrases                                                                                                           25.00
  Misc/Unclear                                                                                                                                                              0.00
  None of the above                                                                                                                                                         0.00
  Other                                                                                                                                                                   100.00
  Physical breathing effort                                                                                                                                                21.74
  Physical breathing effort,Air hunger                                                                                                                                     11.11
  Physical breathing effort,Air hunger,Breathing a lot/Unplanned breaths                                                                                                    0.00
  Physical breathing effort,Air hunger,Breathing a lot/Unplanned breaths,Can't finish phrases                                                                               0.00
  Physical breathing effort,Air hunger,Can't finish phrases                                                                                                                 0.00
  Physical breathing effort,Air hunger,Chest tightness                                                                                                                     50.00
  Physical breathing effort,Air hunger,Chest tightness,Can't finish phrases                                                                                                 0.00
  Physical breathing effort,Air hunger,Chest tightness,Mental breathing effort                                                                                              0.00
  Physical breathing effort,Air hunger,Chest tightness,Mental breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases                                       0.00
  Physical breathing effort,Air hunger,Chest tightness,Mental breathing effort,Can't finish phrases                                                                         0.00
  Physical breathing effort,Air hunger,Mental breathing effort                                                                                                              0.00
  Physical breathing effort,Air hunger,Mental breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases                                                      25.00
  Physical breathing effort,Air hunger,Mental breathing effort,Can't finish phrases                                                                                         0.00
  Physical breathing effort,Air hunger,Mental breathing effort,Unplanned breaths,Can't finish phrases                                                                       0.00
  Physical breathing effort,Air hunger,Unplanned breaths                                                                                                                  100.00
  Physical breathing effort,Air hunger,Unplanned breaths,Can't finish phrases                                                                                               0.00
  Physical breathing effort,Breathing a lot/Unplanned breaths                                                                                                              50.00
  Physical breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases                                                                                         50.00
  Physical breathing effort,Breathing a lot/Unplanned breaths,Other                                                                                                       100.00
  Physical breathing effort,Can't finish phrases                                                                                                                            8.33
  Physical breathing effort,Can't finish phrases,Other                                                                                                                      0.00
  Physical breathing effort,Chest tightness                                                                                                                                20.00
  Physical breathing effort,Chest tightness,Breathing a lot/Unplanned breaths                                                                                              50.00
  Physical breathing effort,Chest tightness,Breathing a lot/Unplanned breaths,Can't finish phrases                                                                        100.00
  Physical breathing effort,Chest tightness,Can't finish phrases                                                                                                           33.33
  Physical breathing effort,Chest tightness,Mental breathing effort                                                                                                         0.00
  Physical breathing effort,Chest tightness,Mental breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases                                                  0.00
  Physical breathing effort,Chest tightness,Mental breathing effort,Can't finish phrases                                                                                    0.00
  Physical breathing effort,Chest tightness,Unplanned breaths                                                                                                             100.00
  Physical breathing effort,Chest tightness,Unplanned breaths,Can't finish phrases                                                                                          0.00
  Physical breathing effort,Mental breathing effort                                                                                                                        33.33
  Physical breathing effort,Mental breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases                                                                  0.00
  Physical breathing effort,Mental breathing effort,Can't finish phrases                                                                                                   12.50
  Physical breathing effort,Mental breathing effort,Other                                                                                                                   0.00
  Physical breathing effort,Mental breathing effort,Unplanned breaths                                                                                                      75.00
  Physical breathing effort,Mental breathing effort,Unplanned breaths,Can't finish phrases                                                                                100.00
  Physical breathing effort,Other                                                                                                                                          25.00
  Physical breathing effort,Unplanned breaths,Can't finish phrases                                                                                                          0.00
  Physical breathing effort,Unplanned breaths,Can't finish phrases,Other                                                                                                  100.00
  Unplanned breaths                                                                                                                                                        66.67
  Unplanned breaths,Can't finish phrases                                                                                                                                    8.00
                                                                                                                                                                         
                                                                                                                                                                               1
  Air hunger                                                                                                                                                               45.16
  Air hunger,Breathing a lot/Unplanned breaths                                                                                                                            100.00
  Air hunger,Breathing a lot/Unplanned breaths,Can't finish phrases                                                                                                        65.52
  Air hunger,Can't finish phrases                                                                                                                                          70.59
  Air hunger,Can't finish phrases,Other                                                                                                                                    50.00
  Air hunger,Chest tightness                                                                                                                                               66.67
  Air hunger,Chest tightness,Breathing a lot/Unplanned breaths                                                                                                              0.00
  Air hunger,Chest tightness,Breathing a lot/Unplanned breaths,Can't finish phrases                                                                                       100.00
  Air hunger,Chest tightness,Can't finish phrases                                                                                                                          42.86
  Air hunger,Chest tightness,Mental breathing effort                                                                                                                      100.00
  Air hunger,Chest tightness,Mental breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases                                                               100.00
  Air hunger,Chest tightness,Mental breathing effort,Unplanned breaths                                                                                                    100.00
  Air hunger,Chest tightness,Unplanned breaths                                                                                                                            100.00
  Air hunger,Chest tightness,Unplanned breaths,Can't finish phrases                                                                                                       100.00
  Air hunger,Mental breathing effort                                                                                                                                       66.67
  Air hunger,Mental breathing effort,Breathing a lot/Unplanned breaths                                                                                                    100.00
  Air hunger,Mental breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases                                                                                90.00
  Air hunger,Mental breathing effort,Can't finish phrases                                                                                                                  81.82
  Air hunger,Mental breathing effort,Unplanned breaths                                                                                                                    100.00
  Air hunger,Unplanned breaths                                                                                                                                             66.67
  Air hunger,Unplanned breaths,Can't finish phrases                                                                                                                        66.67
  Breathing a lot/Unplanned breaths                                                                                                                                        54.55
  Breathing a lot/Unplanned breaths,Can't finish phrases                                                                                                                   59.52
  Breathing a lot/Unplanned breaths,Other                                                                                                                                   0.00
  Breathing discomfort                                                                                                                                                     42.11
  Breathing discomfort,Air hunger                                                                                                                                           0.00
  Breathing discomfort,Air hunger,Breathing a lot/Unplanned breaths                                                                                                       100.00
  Breathing discomfort,Air hunger,Breathing a lot/Unplanned breaths,Can't finish phrases                                                                                   50.00
  Breathing discomfort,Air hunger,Can't finish phrases                                                                                                                     80.00
  Breathing discomfort,Air hunger,Chest tightness                                                                                                                         100.00
  Breathing discomfort,Air hunger,Chest tightness,Breathing a lot/Unplanned breaths                                                                                       100.00
  Breathing discomfort,Air hunger,Chest tightness,Breathing a lot/Unplanned breaths,Can't finish phrases                                                                  100.00
  Breathing discomfort,Air hunger,Chest tightness,Can't finish phrases                                                                                                    100.00
  Breathing discomfort,Air hunger,Chest tightness,Mental breathing effort                                                                                                 100.00
  Breathing discomfort,Air hunger,Chest tightness,Mental breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases                                           50.00
  Breathing discomfort,Air hunger,Chest tightness,Mental breathing effort,Can't finish phrases                                                                            100.00
  Breathing discomfort,Air hunger,Mental breathing effort                                                                                                                 100.00
  Breathing discomfort,Air hunger,Mental breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases                                                          100.00
  Breathing discomfort,Air hunger,Mental breathing effort,Can't finish phrases                                                                                            100.00
  Breathing discomfort,Air hunger,Mental breathing effort,Unplanned breaths,Can't finish phrases                                                                          100.00
  Breathing discomfort,Air hunger,Other                                                                                                                                     0.00
  Breathing discomfort,Air hunger,Unplanned breaths                                                                                                                       100.00
  Breathing discomfort,Breathing a lot/Unplanned breaths                                                                                                                   66.67
  Breathing discomfort,Breathing a lot/Unplanned breaths,Can't finish phrases                                                                                             100.00
  Breathing discomfort,Can't finish phrases                                                                                                                                80.00
  Breathing discomfort,Chest tightness                                                                                                                                     80.00
  Breathing discomfort,Chest tightness,Breathing a lot/Unplanned breaths                                                                                                  100.00
  Breathing discomfort,Chest tightness,Can't finish phrases                                                                                                                60.00
  Breathing discomfort,Chest tightness,Mental breathing effort                                                                                                             75.00
  Breathing discomfort,Chest tightness,Mental breathing effort,Breathing a lot/Unplanned breaths                                                                            0.00
  Breathing discomfort,Chest tightness,Unplanned breaths                                                                                                                   66.67
  Breathing discomfort,Chest tightness,Unplanned breaths,Can't finish phrases                                                                                             100.00
  Breathing discomfort,Mental breathing effort                                                                                                                            100.00
  Breathing discomfort,Mental breathing effort,Can't finish phrases                                                                                                       100.00
  Breathing discomfort,Physical breathing effort                                                                                                                           50.00
  Breathing discomfort,Physical breathing effort,Air hunger                                                                                                                 0.00
  Breathing discomfort,Physical breathing effort,Air hunger,Breathing a lot/Unplanned breaths,Can't finish phrases                                                         33.33
  Breathing discomfort,Physical breathing effort,Air hunger,Chest tightness,Mental breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases                 50.00
  Breathing discomfort,Physical breathing effort,Air hunger,Chest tightness,Mental breathing effort,Can't finish phrases                                                  100.00
  Breathing discomfort,Physical breathing effort,Air hunger,Chest tightness,Mental breathing effort,Unplanned breaths,Can't finish phrases                                100.00
  Breathing discomfort,Physical breathing effort,Air hunger,Mental breathing effort                                                                                       100.00
  Breathing discomfort,Physical breathing effort,Air hunger,Mental breathing effort,Unplanned breaths                                                                       0.00
  Breathing discomfort,Physical breathing effort,Air hunger,Mental breathing effort,Unplanned breaths,Can't finish phrases                                                100.00
  Breathing discomfort,Physical breathing effort,Breathing a lot/Unplanned breaths                                                                                        100.00
  Breathing discomfort,Physical breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases                                                                   100.00
  Breathing discomfort,Physical breathing effort,Can't finish phrases                                                                                                      33.33
  Breathing discomfort,Physical breathing effort,Chest tightness                                                                                                          100.00
  Breathing discomfort,Physical breathing effort,Chest tightness,Breathing a lot/Unplanned breaths                                                                          0.00
  Breathing discomfort,Physical breathing effort,Chest tightness,Breathing a lot/Unplanned breaths,Can't finish phrases                                                     0.00
  Breathing discomfort,Physical breathing effort,Chest tightness,Can't finish phrases                                                                                     100.00
  Breathing discomfort,Physical breathing effort,Chest tightness,Mental breathing effort                                                                                  100.00
  Breathing discomfort,Physical breathing effort,Chest tightness,Mental breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases                           100.00
  Breathing discomfort,Physical breathing effort,Chest tightness,Mental breathing effort,Unplanned breaths,Can't finish phrases                                           100.00
  Breathing discomfort,Physical breathing effort,Chest tightness,Unplanned breaths                                                                                        100.00
  Breathing discomfort,Physical breathing effort,Chest tightness,Unplanned breaths,Can't finish phrases                                                                   100.00
  Breathing discomfort,Physical breathing effort,Mental breathing effort,Breathing a lot/Unplanned breaths                                                                 50.00
  Breathing discomfort,Physical breathing effort,Mental breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases                                             0.00
  Breathing discomfort,Physical breathing effort,Mental breathing effort,Can't finish phrases                                                                              66.67
  Breathing discomfort,Physical breathing effort,Mental breathing effort,Unplanned breaths,Can't finish phrases                                                           100.00
  Breathing discomfort,Physical breathing effort,Unplanned breaths                                                                                                        100.00
  Breathing discomfort,Unplanned breaths                                                                                                                                   50.00
  Breathing discomfort,Unplanned breaths,Can't finish phrases                                                                                                             100.00
  Breathlessness                                                                                                                                                           50.00
  Breathlessness,Air hunger                                                                                                                                                72.73
  Breathlessness,Air hunger,Breathing a lot/Unplanned breaths                                                                                                             100.00
  Breathlessness,Air hunger,Breathing a lot/Unplanned breaths,Can't finish phrases                                                                                         71.88
  Breathlessness,Air hunger,Breathing a lot/Unplanned breaths,Can't finish phrases,Other                                                                                  100.00
  Breathlessness,Air hunger,Can't finish phrases                                                                                                                           81.25
  Breathlessness,Air hunger,Can't finish phrases,Other                                                                                                                    100.00
  Breathlessness,Air hunger,Chest tightness                                                                                                                                75.00
  Breathlessness,Air hunger,Chest tightness,Breathing a lot/Unplanned breaths                                                                                             100.00
  Breathlessness,Air hunger,Chest tightness,Breathing a lot/Unplanned breaths,Can't finish phrases                                                                         80.00
  Breathlessness,Air hunger,Chest tightness,Breathing a lot/Unplanned breaths,Other                                                                                         0.00
  Breathlessness,Air hunger,Chest tightness,Can't finish phrases                                                                                                          100.00
  Breathlessness,Air hunger,Chest tightness,Mental breathing effort                                                                                                         0.00
  Breathlessness,Air hunger,Chest tightness,Mental breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases                                                 66.67
  Breathlessness,Air hunger,Chest tightness,Mental breathing effort,Can't finish phrases                                                                                  100.00
  Breathlessness,Air hunger,Chest tightness,Unplanned breaths                                                                                                             100.00
  Breathlessness,Air hunger,Chest tightness,Unplanned breaths,Can't finish phrases                                                                                         66.67
  Breathlessness,Air hunger,Mental breathing effort                                                                                                                         0.00
  Breathlessness,Air hunger,Mental breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases                                                                 80.00
  Breathlessness,Air hunger,Mental breathing effort,Breathing a lot/Unplanned breaths,Other                                                                               100.00
  Breathlessness,Air hunger,Mental breathing effort,Can't finish phrases                                                                                                   80.00
  Breathlessness,Air hunger,Unplanned breaths,Can't finish phrases                                                                                                         85.71
  Breathlessness,Breathing a lot/Unplanned breaths                                                                                                                         50.00
  Breathlessness,Breathing a lot/Unplanned breaths,Can't finish phrases                                                                                                    56.25
  Breathlessness,Breathing a lot/Unplanned breaths,Can't finish phrases,Other                                                                                              50.00
  Breathlessness,Breathing discomfort                                                                                                                                      50.00
  Breathlessness,Breathing discomfort,Air hunger,Breathing a lot/Unplanned breaths                                                                                         50.00
  Breathlessness,Breathing discomfort,Air hunger,Breathing a lot/Unplanned breaths,Can't finish phrases                                                                    71.43
  Breathlessness,Breathing discomfort,Air hunger,Can't finish phrases                                                                                                      66.67
  Breathlessness,Breathing discomfort,Air hunger,Chest tightness                                                                                                           80.00
  Breathlessness,Breathing discomfort,Air hunger,Chest tightness,Breathing a lot/Unplanned breaths                                                                         50.00
  Breathlessness,Breathing discomfort,Air hunger,Chest tightness,Breathing a lot/Unplanned breaths,Can't finish phrases                                                    63.64
  Breathlessness,Breathing discomfort,Air hunger,Chest tightness,Can't finish phrases                                                                                     100.00
  Breathlessness,Breathing discomfort,Air hunger,Chest tightness,Mental breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases                           100.00
  Breathlessness,Breathing discomfort,Air hunger,Chest tightness,Mental breathing effort,Can't finish phrases                                                               0.00
  Breathlessness,Breathing discomfort,Air hunger,Chest tightness,Mental breathing effort,Unplanned breaths,Can't finish phrases                                           100.00
  Breathlessness,Breathing discomfort,Air hunger,Chest tightness,Unplanned breaths,Can't finish phrases                                                                   100.00
  Breathlessness,Breathing discomfort,Air hunger,Chest tightness,Unplanned breaths,Can't finish phrases,Other                                                             100.00
  Breathlessness,Breathing discomfort,Air hunger,Mental breathing effort                                                                                                  100.00
  Breathlessness,Breathing discomfort,Air hunger,Mental breathing effort,Unplanned breaths,Can't finish phrases                                                           100.00
  Breathlessness,Breathing discomfort,Air hunger,Other                                                                                                                    100.00
  Breathlessness,Breathing discomfort,Air hunger,Unplanned breaths,Can't finish phrases                                                                                     0.00
  Breathlessness,Breathing discomfort,Breathing a lot/Unplanned breaths,Can't finish phrases                                                                                0.00
  Breathlessness,Breathing discomfort,Can't finish phrases                                                                                                                 75.00
  Breathlessness,Breathing discomfort,Chest tightness                                                                                                                      85.71
  Breathlessness,Breathing discomfort,Chest tightness,Breathing a lot/Unplanned breaths                                                                                   100.00
  Breathlessness,Breathing discomfort,Chest tightness,Breathing a lot/Unplanned breaths,Can't finish phrases                                                                0.00
  Breathlessness,Breathing discomfort,Chest tightness,Can't finish phrases                                                                                                 60.00
  Breathlessness,Breathing discomfort,Chest tightness,Mental breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases                                      100.00
  Breathlessness,Breathing discomfort,Chest tightness,Mental breathing effort,Can't finish phrases                                                                        100.00
  Breathlessness,Breathing discomfort,Chest tightness,Unplanned breaths                                                                                                   100.00
  Breathlessness,Breathing discomfort,Chest tightness,Unplanned breaths,Can't finish phrases                                                                              100.00
  Breathlessness,Breathing discomfort,Mental breathing effort,Breathing a lot/Unplanned breaths                                                                           100.00
  Breathlessness,Breathing discomfort,Mental breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases                                                        0.00
  Breathlessness,Breathing discomfort,Mental breathing effort,Can't finish phrases                                                                                        100.00
  Breathlessness,Breathing discomfort,Physical breathing effort                                                                                                           100.00
  Breathlessness,Breathing discomfort,Physical breathing effort,Air hunger                                                                                                100.00
  Breathlessness,Breathing discomfort,Physical breathing effort,Air hunger,Breathing a lot/Unplanned breaths                                                              100.00
  Breathlessness,Breathing discomfort,Physical breathing effort,Air hunger,Breathing a lot/Unplanned breaths,Can't finish phrases                                          85.71
  Breathlessness,Breathing discomfort,Physical breathing effort,Air hunger,Breathing a lot/Unplanned breaths,Can't finish phrases,Other                                   100.00
  Breathlessness,Breathing discomfort,Physical breathing effort,Air hunger,Can't finish phrases                                                                           100.00
  Breathlessness,Breathing discomfort,Physical breathing effort,Air hunger,Chest tightness                                                                                100.00
  Breathlessness,Breathing discomfort,Physical breathing effort,Air hunger,Chest tightness,Breathing a lot/Unplanned breaths                                              100.00
  Breathlessness,Breathing discomfort,Physical breathing effort,Air hunger,Chest tightness,Breathing a lot/Unplanned breaths,Can't finish phrases                         100.00
  Breathlessness,Breathing discomfort,Physical breathing effort,Air hunger,Chest tightness,Can't finish phrases                                                            71.43
  Breathlessness,Breathing discomfort,Physical breathing effort,Air hunger,Chest tightness,Mental breathing effort                                                        100.00
  Breathlessness,Breathing discomfort,Physical breathing effort,Air hunger,Chest tightness,Mental breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases  88.89
  Breathlessness,Breathing discomfort,Physical breathing effort,Air hunger,Chest tightness,Mental breathing effort,Can't finish phrases                                    66.67
  Breathlessness,Breathing discomfort,Physical breathing effort,Air hunger,Chest tightness,Mental breathing effort,Unplanned breaths,Can't finish phrases                 100.00
  Breathlessness,Breathing discomfort,Physical breathing effort,Air hunger,Chest tightness,Unplanned breaths,Can't finish phrases                                           0.00
  Breathlessness,Breathing discomfort,Physical breathing effort,Air hunger,Mental breathing effort,Breathing a lot/Unplanned breaths                                        0.00
  Breathlessness,Breathing discomfort,Physical breathing effort,Air hunger,Mental breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases                  75.00
  Breathlessness,Breathing discomfort,Physical breathing effort,Air hunger,Mental breathing effort,Can't finish phrases                                                     0.00
  Breathlessness,Breathing discomfort,Physical breathing effort,Air hunger,Mental breathing effort,Unplanned breaths,Can't finish phrases                                 100.00
  Breathlessness,Breathing discomfort,Physical breathing effort,Air hunger,Unplanned breaths,Can't finish phrases                                                          50.00
  Breathlessness,Breathing discomfort,Physical breathing effort,Breathing a lot/Unplanned breaths                                                                         100.00
  Breathlessness,Breathing discomfort,Physical breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases                                                     83.33
  Breathlessness,Breathing discomfort,Physical breathing effort,Can't finish phrases                                                                                        0.00
  Breathlessness,Breathing discomfort,Physical breathing effort,Chest tightness                                                                                           100.00
  Breathlessness,Breathing discomfort,Physical breathing effort,Chest tightness,Breathing a lot/Unplanned breaths,Can't finish phrases                                     66.67
  Breathlessness,Breathing discomfort,Physical breathing effort,Chest tightness,Mental breathing effort                                                                     0.00
  Breathlessness,Breathing discomfort,Physical breathing effort,Chest tightness,Mental breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases            100.00
  Breathlessness,Breathing discomfort,Physical breathing effort,Chest tightness,Mental breathing effort,Can't finish phrases                                               66.67
  Breathlessness,Breathing discomfort,Physical breathing effort,Chest tightness,Mental breathing effort,Unplanned breaths,Can't finish phrases                            100.00
  Breathlessness,Breathing discomfort,Physical breathing effort,Mental breathing effort                                                                                   100.00
  Breathlessness,Breathing discomfort,Physical breathing effort,Mental breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases                              0.00
  Breathlessness,Breathing discomfort,Physical breathing effort,Mental breathing effort,Can't finish phrases                                                              100.00
  Breathlessness,Breathing discomfort,Physical breathing effort,Unplanned breaths                                                                                         100.00
  Breathlessness,Breathing discomfort,Physical breathing effort,Unplanned breaths,Can't finish phrases                                                                    100.00
  Breathlessness,Breathing discomfort,Unplanned breaths,Can't finish phrases                                                                                              100.00
  Breathlessness,Can't finish phrases                                                                                                                                      66.67
  Breathlessness,Can't finish phrases,Other                                                                                                                                50.00
  Breathlessness,Chest tightness                                                                                                                                           83.33
  Breathlessness,Chest tightness,Breathing a lot/Unplanned breaths                                                                                                         50.00
  Breathlessness,Chest tightness,Breathing a lot/Unplanned breaths,Can't finish phrases                                                                                    50.00
  Breathlessness,Chest tightness,Can't finish phrases                                                                                                                      53.85
  Breathlessness,Chest tightness,Mental breathing effort                                                                                                                    0.00
  Breathlessness,Chest tightness,Unplanned breaths,Can't finish phrases                                                                                                    66.67
  Breathlessness,Mental breathing effort                                                                                                                                  100.00
  Breathlessness,Mental breathing effort,Breathing a lot/Unplanned breaths                                                                                                 50.00
  Breathlessness,Mental breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases                                                                           100.00
  Breathlessness,Mental breathing effort,Can't finish phrases                                                                                                              50.00
  Breathlessness,Mental breathing effort,Unplanned breaths                                                                                                                100.00
  Breathlessness,Mental breathing effort,Unplanned breaths,Can't finish phrases                                                                                           100.00
  Breathlessness,Other                                                                                                                                                      0.00
  Breathlessness,Physical breathing effort                                                                                                                                 57.14
  Breathlessness,Physical breathing effort,Air hunger                                                                                                                     100.00
  Breathlessness,Physical breathing effort,Air hunger,Breathing a lot/Unplanned breaths                                                                                   100.00
  Breathlessness,Physical breathing effort,Air hunger,Breathing a lot/Unplanned breaths,Can't finish phrases                                                               87.50
  Breathlessness,Physical breathing effort,Air hunger,Can't finish phrases                                                                                                 33.33
  Breathlessness,Physical breathing effort,Air hunger,Chest tightness                                                                                                     100.00
  Breathlessness,Physical breathing effort,Air hunger,Chest tightness,Breathing a lot/Unplanned breaths,Can't finish phrases                                               85.71
  Breathlessness,Physical breathing effort,Air hunger,Chest tightness,Breathing a lot/Unplanned breaths,Can't finish phrases,Other                                        100.00
  Breathlessness,Physical breathing effort,Air hunger,Chest tightness,Mental breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases                       50.00
  Breathlessness,Physical breathing effort,Air hunger,Chest tightness,Mental breathing effort,Can't finish phrases                                                        100.00
  Breathlessness,Physical breathing effort,Air hunger,Chest tightness,Mental breathing effort,Unplanned breaths,Can't finish phrases                                      100.00
  Breathlessness,Physical breathing effort,Air hunger,Chest tightness,Unplanned breaths                                                                                   100.00
  Breathlessness,Physical breathing effort,Air hunger,Chest tightness,Unplanned breaths,Can't finish phrases                                                              100.00
  Breathlessness,Physical breathing effort,Air hunger,Mental breathing effort                                                                                             100.00
  Breathlessness,Physical breathing effort,Air hunger,Mental breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases                                       50.00
  Breathlessness,Physical breathing effort,Air hunger,Mental breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases,Other                                100.00
  Breathlessness,Physical breathing effort,Air hunger,Mental breathing effort,Can't finish phrases                                                                         75.00
  Breathlessness,Physical breathing effort,Air hunger,Mental breathing effort,Unplanned breaths,Can't finish phrases                                                       66.67
  Breathlessness,Physical breathing effort,Air hunger,Mental breathing effort,Unplanned breaths,Can't finish phrases,Other                                                100.00
  Breathlessness,Physical breathing effort,Air hunger,Unplanned breaths,Can't finish phrases                                                                              100.00
  Breathlessness,Physical breathing effort,Breathing a lot/Unplanned breaths                                                                                              100.00
  Breathlessness,Physical breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases                                                                          87.50
  Breathlessness,Physical breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases,Other                                                                    50.00
  Breathlessness,Physical breathing effort,Can't finish phrases                                                                                                           100.00
  Breathlessness,Physical breathing effort,Chest tightness                                                                                                                 25.00
  Breathlessness,Physical breathing effort,Chest tightness,Breathing a lot/Unplanned breaths,Can't finish phrases                                                          50.00
  Breathlessness,Physical breathing effort,Chest tightness,Can't finish phrases                                                                                           100.00
  Breathlessness,Physical breathing effort,Chest tightness,Mental breathing effort                                                                                        100.00
  Breathlessness,Physical breathing effort,Chest tightness,Mental breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases                                 100.00
  Breathlessness,Physical breathing effort,Chest tightness,Unplanned breaths,Can't finish phrases                                                                         100.00
  Breathlessness,Physical breathing effort,Mental breathing effort,Breathing a lot/Unplanned breaths                                                                      100.00
  Breathlessness,Physical breathing effort,Mental breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases                                                 100.00
  Breathlessness,Physical breathing effort,Mental breathing effort,Can't finish phrases                                                                                    75.00
  Breathlessness,Physical breathing effort,Mental breathing effort,Unplanned breaths                                                                                        0.00
  Breathlessness,Physical breathing effort,Mental breathing effort,Unplanned breaths,Can't finish phrases                                                                 100.00
  Breathlessness,Physical breathing effort,Unplanned breaths,Can't finish phrases                                                                                          66.67
  Breathlessness,Unplanned breaths                                                                                                                                        100.00
  Breathlessness,Unplanned breaths,Can't finish phrases                                                                                                                    81.82
  Can't finish phrases                                                                                                                                                     71.82
  Can't finish phrases,Breathing discomfort                                                                                                                               100.00
  Can't finish phrases,Mental breathing effort                                                                                                                            100.00
  Can't finish phrases,Other                                                                                                                                               66.67
  Can't finish phrases,Unplanned breaths                                                                                                                                  100.00
  Chest tightness                                                                                                                                                          47.62
  Chest tightness,Breathing a lot/Unplanned breaths                                                                                                                       100.00
  Chest tightness,Breathing a lot/Unplanned breaths,Can't finish phrases                                                                                                    0.00
  Chest tightness,Can't finish phrases                                                                                                                                     83.33
  Chest tightness,Mental breathing effort                                                                                                                                 100.00
  Chest tightness,Mental breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases                                                                          100.00
  Chest tightness,Mental breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases,Other                                                                    100.00
  Chest tightness,Mental breathing effort,Can't finish phrases                                                                                                            100.00
  Chest tightness,Other                                                                                                                                                   100.00
  Chest tightness,Unplanned breaths                                                                                                                                        66.67
  Mental breathing effort                                                                                                                                                  47.06
  Mental breathing effort,Breathing a lot/Unplanned breaths                                                                                                               100.00
  Mental breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases                                                                                           83.33
  Mental breathing effort,Can't finish phrases                                                                                                                             85.71
  Mental breathing effort,Can't finish phrases,Other                                                                                                                       50.00
  Mental breathing effort,Other                                                                                                                                           100.00
  Mental breathing effort,Unplanned breaths,Can't finish phrases                                                                                                           75.00
  Misc/Unclear                                                                                                                                                            100.00
  None of the above                                                                                                                                                       100.00
  Other                                                                                                                                                                     0.00
  Physical breathing effort                                                                                                                                                78.26
  Physical breathing effort,Air hunger                                                                                                                                     88.89
  Physical breathing effort,Air hunger,Breathing a lot/Unplanned breaths                                                                                                  100.00
  Physical breathing effort,Air hunger,Breathing a lot/Unplanned breaths,Can't finish phrases                                                                             100.00
  Physical breathing effort,Air hunger,Can't finish phrases                                                                                                               100.00
  Physical breathing effort,Air hunger,Chest tightness                                                                                                                     50.00
  Physical breathing effort,Air hunger,Chest tightness,Can't finish phrases                                                                                               100.00
  Physical breathing effort,Air hunger,Chest tightness,Mental breathing effort                                                                                            100.00
  Physical breathing effort,Air hunger,Chest tightness,Mental breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases                                     100.00
  Physical breathing effort,Air hunger,Chest tightness,Mental breathing effort,Can't finish phrases                                                                       100.00
  Physical breathing effort,Air hunger,Mental breathing effort                                                                                                            100.00
  Physical breathing effort,Air hunger,Mental breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases                                                      75.00
  Physical breathing effort,Air hunger,Mental breathing effort,Can't finish phrases                                                                                       100.00
  Physical breathing effort,Air hunger,Mental breathing effort,Unplanned breaths,Can't finish phrases                                                                     100.00
  Physical breathing effort,Air hunger,Unplanned breaths                                                                                                                    0.00
  Physical breathing effort,Air hunger,Unplanned breaths,Can't finish phrases                                                                                             100.00
  Physical breathing effort,Breathing a lot/Unplanned breaths                                                                                                              50.00
  Physical breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases                                                                                         50.00
  Physical breathing effort,Breathing a lot/Unplanned breaths,Other                                                                                                         0.00
  Physical breathing effort,Can't finish phrases                                                                                                                           91.67
  Physical breathing effort,Can't finish phrases,Other                                                                                                                    100.00
  Physical breathing effort,Chest tightness                                                                                                                                80.00
  Physical breathing effort,Chest tightness,Breathing a lot/Unplanned breaths                                                                                              50.00
  Physical breathing effort,Chest tightness,Breathing a lot/Unplanned breaths,Can't finish phrases                                                                          0.00
  Physical breathing effort,Chest tightness,Can't finish phrases                                                                                                           66.67
  Physical breathing effort,Chest tightness,Mental breathing effort                                                                                                       100.00
  Physical breathing effort,Chest tightness,Mental breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases                                                100.00
  Physical breathing effort,Chest tightness,Mental breathing effort,Can't finish phrases                                                                                  100.00
  Physical breathing effort,Chest tightness,Unplanned breaths                                                                                                               0.00
  Physical breathing effort,Chest tightness,Unplanned breaths,Can't finish phrases                                                                                        100.00
  Physical breathing effort,Mental breathing effort                                                                                                                        66.67
  Physical breathing effort,Mental breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases                                                                100.00
  Physical breathing effort,Mental breathing effort,Can't finish phrases                                                                                                   87.50
  Physical breathing effort,Mental breathing effort,Other                                                                                                                 100.00
  Physical breathing effort,Mental breathing effort,Unplanned breaths                                                                                                      25.00
  Physical breathing effort,Mental breathing effort,Unplanned breaths,Can't finish phrases                                                                                  0.00
  Physical breathing effort,Other                                                                                                                                          75.00
  Physical breathing effort,Unplanned breaths,Can't finish phrases                                                                                                        100.00
  Physical breathing effort,Unplanned breaths,Can't finish phrases,Other                                                                                                    0.00
  Unplanned breaths                                                                                                                                                        33.33
  Unplanned breaths,Can't finish phrases                                                                                                                                   92.00

6.1 Analyses Used

This report examines the relationship between various predictors and outcomes related to respiratory muscle training (RMT) among wind instrumentalists. The primary statistical method employed was chi-square testing, which evaluates the association between categorical variables by comparing observed frequencies against expected frequencies under the assumption of no relationship. This non-parametric test is appropriate for analyzing categorical data in cross-tabulation format.

The analysis assessed multiple predictor variables against three primary outcomes: - useBody: Use of body awareness/techniques - useDevice: Use of respiratory training devices - useInstrument: Use of the instrument itself for respiratory training

For each predictor-outcome pair, the analysis provides: - Chi-square test statistic - Degrees of freedom (DF) - P-value (significance threshold of p < 0.05) - Effect size measured by Cramer’s V, which quantifies the strength of association between variables

6.2 Analysis Results

Primary Significant Associations

Among the 66 predictor-outcome pairs tested, 57 showed statistically significant associations (p < 0.05). The top three associations based on Cramer’s V effect size were:

  1. WI (Wind Instrument type) vs. useDevice (Cramer’s V = 0.539)
    • Highest effect size overall, indicating strong relationship between instrument type and use of respiratory training devices
    • Chi-square = 452.76, DF = 281, p = 3.45e-10
  2. dyspSymptoms (Dyspnea/Breathing Symptoms) vs. useBody (Cramer’s V = 0.532)
    • Strong association between reported breathing difficulties and body technique usage
    • Chi-square = 392.17, DF = 290, p = 5.82e-05
  3. dyspSymptoms vs. useInstrument (Cramer’s V = 0.509)
    • Substantial relationship between breathing symptoms and using the instrument for respiratory training
    • Chi-square = 359.09, DF = 290, p = 3.52e-03

Key Findings by Outcome

For useBody (Body awareness/techniques): - RMTImprovePerf (belief that RMT improves performance) showed the strongest specific predictor association (Cramer’s V = 0.283, p = 3.65e-25) - influences (influential factors) was strongly associated (Cramer’s V = 0.412, p = 7.34e-20) - role_MAX1 (primary musical role) showed significant impact (Cramer’s V = 0.212, p = 3.66e-15)

For useDevice (Respiratory training devices): - countryLive (country of residence) strongly predicted device usage (Cramer’s V = 0.321, p = 5.25e-17) - influences showed strong association (Cramer’s V = 0.378, p = 7.69e-14) - countryEd (country of education) was significantly related (Cramer’s V = 0.291, p = 1.27e-12)

For useInstrument (Instrument as training tool): - influences had the strongest association (Cramer’s V = 0.451, p = 7.62e-28) - freqPlay_MAX (maximum playing frequency) was highly significant (Cramer’s V = 0.260, p = 8.71e-22) - breathingAware (breathing awareness) showed strong relationship (Cramer’s V = 0.258, p = 7.80e-21)

Detailed Analysis of Top Predictors

The contingency table analysis for the strongest associations revealed several patterns:

Wind Instrument (WI) vs. useDevice: - Certain instrument combinations showed notably higher device usage rates, including: - Breathlessness with physical breathing effort, air hunger, chest tightness, and mental breathing effort (77.8% device usage) - Combinations involving multiple woodwind instruments with brass instruments - Piccolo players, particularly when combined with other instruments

Dyspnea Symptoms vs. useBody: - Complex symptom patterns involving multiple respiratory difficulties (e.g., air hunger, chest tightness, and mental breathing effort) were associated with the highest rates of body technique usage (>75%) - Breathlessness combined with physical breathing effort showed particularly strong association with body awareness techniques

Respiratory Improvement Beliefs vs. useBody: - Strong belief in RMT performance improvement was highly predictive of using body-based approaches - The row percentages indicate that instrumentalists who perceived benefits from RMT were significantly more likely to incorporate body awareness techniques

6.3 Result Interpretation

Instrument-Specific Effects and Device Usage

The strong association between instrument type and device usage aligns with previous research on the physiological demands of different wind instruments. Bouhuys (1964) found that different wind instruments impose variable respiratory loads, with high-resistance instruments requiring greater respiratory muscle activity. This explains why players of instruments with higher resistance might be more inclined to utilize respiratory training devices.

Ackermann et al. (2014) noted that professional wind musicians often develop respiratory muscle adaptations specific to their instruments, which may influence their approach to supplementary training. Our findings extend this understanding by demonstrating that instrument choice significantly influences training device selection and usage patterns.

The varied device usage across different instrument combinations suggests that musicians playing multiple instruments may experience more complex respiratory demands, leading to greater interest in supplementary training tools. This aligns with Drinkwater and Wong’s (2017) observation that versatile musicians develop more sophisticated respiratory control strategies.

Symptom Experience and Training Approaches

The strong relationship between dyspnea symptoms and body-based approaches suggests that musicians experiencing respiratory difficulties often turn to somatic techniques. This supports Staes et al. (2011), who found that musicians experiencing performance-related musculoskeletal disorders frequently seek body awareness approaches like Alexander Technique or Feldenkrais Method.

The high prevalence of combined symptoms (breathlessness, physical effort, and mental components) associated with body technique usage indicates that musicians may recognize the multifaceted nature of respiratory function. This aligns with Franklin’s (2018) concept of integrated breathing coordination in musicians, emphasizing the connection between physical sensation, mental focus, and respiratory performance.

Ericson et al. (2012) noted that respiratory symptoms in wind players often prompt exploration of different pedagogical approaches, which our data supports by showing symptom experiences strongly predict training method selection.

Beliefs, Education, and Geographic Influences

The significant association between performance improvement beliefs and body technique usage reflects findings from Sandell et al. (2009), who demonstrated that musicians’ beliefs about efficacy strongly influence their practice behaviors. Similarly, the geographic variations in device usage (countryLive, countryEd) suggest cultural and educational differences in respiratory training approaches, supporting Matei and Ginsborg’s (2017) observation of significant international variations in conservatory teaching methods.

The relationship between education level and training methods aligns with Watson’s (2009) finding that formal music education often includes exposure to varied pedagogical approaches, potentially including respiratory techniques. Advanced education may increase awareness of and access to specialized training methods.

6.4 Limitations

Several limitations should be considered when interpreting these findings:

  1. Causality: As a cross-sectional chi-square analysis, these results establish associations but cannot determine causal relationships. For example, we cannot determine whether respiratory symptoms led to body technique adoption or if pre-existing use of these techniques influenced symptom reporting.

  2. Self-reporting: All data appears to be self-reported, introducing potential recall bias, particularly regarding symptom experiences and training behaviors. See above for more information.

  3. Categorization: The analysis categorized complex variables (like specific symptoms or instrument combinations) into necessarily simplified groups, potentially obscuring more nuanced relationships.

  4. Sample representation: Without detailed demographic information, we cannot assess how well the sample represents the broader population of wind instrumentalists across different proficiency levels, ages, or cultural contexts.

  5. Statistical considerations: Multiple testing increases the risk of Type I errors, despite strong significance values. Additionally, the analysis doesn’t account for potential confounding variables that might explain some associations.

  6. Temporal aspects: The data doesn’t capture duration or intensity of training approaches, limiting understanding of dose-response relationships in respiratory training effects.

6.5 Conclusions

This analysis reveals significant patterns in how wind instrumentalists approach respiratory muscle training, with clear associations between instrument type, symptom experiences, beliefs about training efficacy, and the selection of training approaches. Several key conclusions emerge:

  1. Instrument-specific approaches: Different wind instruments and instrument combinations are associated with distinct respiratory training preferences, suggesting that RMT approaches should be tailored to the specific demands of each instrument category.

  2. Symptom-driven training: Respiratory symptoms strongly predict training method selection, with complex symptom patterns particularly associated with body-based approaches. This suggests that addressing symptom experiences should be central to respiratory training program design.

  3. Geographic and educational influences: Training approaches vary significantly based on country of residence and education, highlighting the importance of cultural and educational contexts in shaping respiratory training practices.

  4. Integrated approaches: The strongest associations often involved multiple factors (complex symptom patterns, multiple instruments), suggesting that comprehensive approaches addressing both physical and mental aspects of respiration may be most effective.

  5. Belief systems matter: Musicians’ beliefs about training efficacy significantly influence their training choices, underscoring the importance of addressing perceptual and cognitive aspects alongside physical training.

These findings provide valuable insights for music educators, health professionals working with musicians, and wind instrument performers seeking to optimize their respiratory function. Future research should employ longitudinal designs to establish causal relationships and determine which training approaches most effectively address specific respiratory challenges in wind instrumentalists.

6.6 References

**Ackermann, B. J., Kenny, D. T., & Fortune, J. (2014). Incidence of injury and attitudes to injury management in skilled flute players. Work, 46(4), 449-456.

**Bouhuys, A. (1964). Lung volumes and breathing patterns in wind-instrument players. Journal of Applied Physiology, 19(5), 967-975.

**Franklin, E. (2018). Dynamic alignment through imagery (3rd ed.). Human Kinetics.

**Matei, R., & Ginsborg, J. (2017). Music performance anxiety in classical musicians – what we know about what works. BJPsych International, 14(2), 33-35.

**Sandell, C., Frykman, M., Chesky, K., & Fjellman-Wiklund, A. (2009). Playing-related musculoskeletal disorders and stress-related health problems among percussionists. Medical Problems of Performing Artists, 24(4), 175-180.

**Staes, F. F., Jansen, L., Vilette, A., Coveliers, Y., Daniels, K., & Decoster, W. (2011). Physical therapy as a means to optimize posture and voice parameters in student classical singers: A case report. Journal of Voice, 25(3), e91-e101.

**Watson, A. (2009). The biology of musical performance and performance-related injury. Scarecrow Press.

7 CART Decision Trees

Code
# Create binary variable for device usage
df$useDevice <- ifelse(!is.na(df$freqRMT_withDevice) & df$freqRMT_withDevice != "Never", 1, 0)

# Define predictors
predictors <- c("role_MAX1", "playAbility_MAX", "yrsPlay_MAX", "freqPlay_MAX", 
                "WI", "countryEd", "countryLive", "ed", "gender",
                "bodyImportant_face", "bodyImportant_airways", "bodyImportant_respMusc",
                "bodyImportant_posture", "bodyImportant_diaphragm", "bodyImportant_abs",
                "bodyImportant_ribs", "bodyImportant_accessory", "isPlayingEnough",
                "RMTImprovePerf", "influences", "breathingAware", "dyspSymptoms")

# Clean the data - remove rows with missing values in key variables
df_clean <- df[complete.cases(df[, c("useDevice", predictors)]), ]
print(paste("Original rows:", nrow(df)))
[1] "Original rows: 1558"
Code
print(paste("Clean rows:", nrow(df_clean)))
[1] "Clean rows: 1386"
Code
# Convert useDevice to factor for classification
df_clean$useDevice <- factor(df_clean$useDevice, levels = c(0, 1), labels = c("No", "Yes"))

# Build decision tree model
tree_model <- rpart(useDevice ~ ., 
                   data = df_clean[, c("useDevice", predictors)],
                   method = "class",
                   cp = 0.01)  # complexity parameter - controls tree size

# Print model details
printcp(tree_model)

Classification tree:
rpart(formula = useDevice ~ ., data = df_clean[, c("useDevice", 
    predictors)], method = "class", cp = 0.01)

Variables actually used in tree construction:
[1] bodyImportant_diaphragm dyspSymptoms            influences             
[4] RMTImprovePerf          WI                     

Root node error: 202/1386 = 0.14574

n= 1386 

        CP nsplit rel error  xerror     xstd
1 0.242574      0   1.00000 1.00000 0.065031
2 0.056931      1   0.75743 0.99505 0.064897
3 0.049505      4   0.55446 1.16832 0.069274
4 0.034653      5   0.50495 1.16832 0.069274
5 0.017327      9   0.36139 1.29208 0.072055
6 0.011139     11   0.32673 1.35149 0.073299
7 0.010000     15   0.28218 1.37129 0.073701
Code
# Plot the decision tree
# If you get an error with rpart.plot, try just printing the text version:
print(tree_model)
n= 1386 

node), split, n, loss, yval, (yprob)
      * denotes terminal node

  1) root 1386 202 No (0.85425685 0.14574315)  
    2) WI=Bagpipes,Bassoon,Bassoon,Other,Bassoon,Saxophone,Bassoon,Saxophone,Tuba,Bassoon,Trombone,Clarinet,Clarinet,Bagpipes,Clarinet,Bassoon,Clarinet,Bassoon,Saxophone,Clarinet,Bassoon,Saxophone,Trombone,Clarinet,Bassoon,Trombone,Clarinet,Flute,Recorder,Saxophone,Clarinet,Flute,Saxophone,Other,Clarinet,Other,Clarinet,Saxophone,Clarinet,Saxophone,Bagpipes,Clarinet,Saxophone,Euphonium,Clarinet,Saxophone,Other,Clarinet,Saxophone,Trombone,Clarinet,Saxophone,Trumpet,Clarinet,Saxophone,Trumpet,Trombone,Euphonium,Clarinet,Saxophone,Trumpet,Trombone,Tuba,Euphonium,Clarinet,Saxophone,Tuba,Clarinet,Trumpet,Clarinet,Trumpet,French Horn,Clarinet,Trumpet,French Horn,Other,Clarinet,Trumpet,Other,Clarinet,Trumpet,Trombone,Clarinet,Trumpet,Trombone,Tuba,Euphonium,Clarinet,Tuba,Euphonium,Flute,Flute,Bagpipes,Flute,Bassoon,Trumpet,French Horn,Trombone,Euphonium,Flute,Clarinet,Flute,Clarinet,Bassoon,Saxophone,Flute,Clarinet,Bassoon,Saxophone,Trumpet,Trombone,Euphonium,Flute,Clarinet,Bassoon,Trumpet,Flute,Clarinet,Euphonium,Flute,Clarinet,Euphonium,Bagpipes,Flute,Clarinet,Saxophone,Flute,Clarinet,Saxophone,Euphonium,Flute,Clarinet,Saxophone,Trombone,Flute,Clarinet,Saxophone,Trumpet,Flute,Clarinet,Saxophone,Trumpet,Bagpipes,Flute,Clarinet,Saxophone,Trumpet,French Horn,Trombone,Tuba,Euphonium,Flute,Clarinet,Saxophone,Trumpet,French Horn/Horn,Other,Flute,Clarinet,Saxophone,Trumpet,Tuba,Flute,Clarinet,Trumpet,French Horn,Trombone,Euphonium,Flute,Clarinet,Trumpet,Tuba,Other,Flute,Clarinet,Tuba,Flute,Euphonium,Flute,French Horn,Flute,Oboe/Cor Anglais,Flute,Oboe/Cor Anglais,Bagpipes,Flute,Oboe/Cor Anglais,Bassoon,Saxophone,Trombone,Tuba,Flute,Oboe/Cor Anglais,Clarinet,Flute,Oboe/Cor Anglais,Clarinet,Bassoon,Saxophone,Flute,Oboe/Cor Anglais,Clarinet,Bassoon,Saxophone,Trumpet,Euphonium,Other,Flute,Oboe/Cor Anglais,Clarinet,Saxophone,Flute,Oboe/Cor Anglais,Saxophone,Flute,Oboe/Cor Anglais,Saxophone,Bagpipes,Flute,Other,Flute,Piccolo,Flute,Piccolo,Bassoon,Flute,Piccolo,Clarinet,Flute,Piccolo,Clarinet,Bassoon,Saxophone,Flute,Piccolo,Clarinet,Saxophone,Flute,Piccolo,Clarinet,Saxophone,Other,Flute,Piccolo,Clarinet,Saxophone,Trumpet,Flute,Piccolo,Clarinet,Saxophone,Trumpet,Trombone,Flute,Piccolo,Oboe/Cor Anglais,Flute,Piccolo,Oboe/Cor Anglais,Clarinet,Flute,Piccolo,Oboe/Cor Anglais,Clarinet,Bassoon,Saxophone,Flute,Piccolo,Oboe/Cor Anglais,Clarinet,Bassoon,Saxophone,Trumpet,French Horn,Tuba,Flute,Piccolo,Oboe/Cor Anglais,Clarinet,Saxophone,Flute,Piccolo,Oboe/Cor Anglais,Saxophone,Flute,Piccolo,Recorder,Flute,Piccolo,Recorder,Clarinet,Saxophone,Flute,Piccolo,Recorder,Clarinet,Saxophone,Trumpet,Flute,Piccolo,Recorder,Clarinet,Saxophone,Trumpet,French Horn,Trombone,Flute,Piccolo,Recorder,Oboe/Cor Anglais,Bassoon,French Horn,Flute,Piccolo,Recorder,Oboe/Cor Anglais,Clarinet,Bassoon,Saxophone,Flute,Piccolo,Recorder,Oboe/Cor Anglais,Clarinet,Saxophone,Flute,Piccolo,Recorder,Oboe/Cor Anglais,Clarinet,Saxophone,Other,Flute,Piccolo,Recorder,Oboe/Cor Anglais,Clarinet,Saxophone,Trombone,Flute,Piccolo,Recorder,Other,Flute,Piccolo,Recorder,Saxophone,Flute,Piccolo,Recorder,Saxophone,Trombone,Flute,Piccolo,Recorder,Trumpet,Flute,Piccolo,Saxophone,Flute,Piccolo,Trumpet,Flute,Recorder,Flute,Recorder,Clarinet,Flute,Recorder,Clarinet,Saxophone,Flute,Recorder,Clarinet,Saxophone,Bagpipes,Flute,Recorder,Clarinet,Trombone,Tuba,Euphonium,Flute,Recorder,Clarinet,Trumpet,Flute,Recorder,Clarinet,Trumpet,Trombone,Euphonium,Flute,Recorder,Oboe/Cor Anglais,Clarinet,Saxophone,Trumpet,Flute,Recorder,Other,Flute,Recorder,Saxophone,Flute,Recorder,Trombone,Flute,Recorder,Trumpet,French Horn,Trombone,Euphonium,Flute,Saxophone,Flute,Saxophone,Other,Flute,Saxophone,Trombone,Flute,Saxophone,Trumpet,Flute,Trombone,Flute,Trombone,Bagpipes,Flute,Trombone,Other,Flute,Trumpet,Flute,Trumpet,Bagpipes,Flute,Trumpet,Other,Flute,Tuba,French Horn,French Horn,Bagpipes,French Horn,Other,French Horn,Trombone,French Horn,Tuba,Oboe/Cor Anglais,Oboe/Cor Anglais,Bassoon,Oboe/Cor Anglais,Bassoon,Saxophone,Trombone,Oboe/Cor Anglais,Clarinet,Oboe/Cor Anglais,Clarinet,Bassoon,Oboe/Cor Anglais,Clarinet,Bassoon,Saxophone,Oboe/Cor Anglais,Clarinet,Bassoon,Trumpet,Oboe/Cor Anglais,Clarinet,French Horn,Oboe/Cor Anglais,French Horn,Oboe/Cor Anglais,French Horn,Tuba,Euphonium,Oboe/Cor Anglais,Saxophone,Oboe/Cor Anglais,Saxophone,Trombone,Oboe/Cor Anglais,Saxophone,Tuba,Oboe/Cor Anglais,Trumpet,Trombone,Other,Piccolo,Piccolo,Bagpipes,Piccolo,Bassoon,Saxophone,Tuba,Piccolo,Clarinet,Piccolo,Oboe/Cor Anglais,Piccolo,Oboe/Cor Anglais,Clarinet,Bassoon,Piccolo,Oboe/Cor Anglais,French Horn,Piccolo,Oboe/Cor Anglais,French Horn,Trombone,Piccolo,Oboe/Cor Anglais,Saxophone,Trombone,Bagpipes,Piccolo,Oboe/Cor Anglais,Trumpet,Piccolo,Saxophone,Piccolo,Trombone,Tuba,Bagpipes,Piccolo,Trumpet,Bagpipes,Piccolo,Trumpet,French Horn,Recorder,Recorder,Bassoon,French Horn,Recorder,Clarinet,Recorder,Clarinet,Other,Recorder,Clarinet,Saxophone,Recorder,Clarinet,Saxophone,Other,Recorder,Clarinet,Saxophone,Trumpet,Recorder,Clarinet,Saxophone,Trumpet,French Horn,Trombone,Tuba,Euphonium,Other,Recorder,Clarinet,Tuba,Recorder,French Horn,Recorder,French Horn,Other,Recorder,Oboe/Cor Anglais,Recorder,Oboe/Cor Anglais,Other,Recorder,Oboe/Cor Anglais,Saxophone,Recorder,Saxophone,Recorder,Saxophone,Trumpet,Recorder,Saxophone,Trumpet,French Horn,Trombone,Recorder,Trombone,Recorder,Trombone,Euphonium,Recorder,Trumpet,Recorder,Trumpet,French Horn,Trombone,Tuba,Euphonium,Bagpipes,Other,Recorder,Trumpet,Trombone,Saxophone,Saxophone,Bagpipes,Saxophone,French Horn,Saxophone,French Horn,Trombone,Saxophone,Other,Saxophone,Trombone,Saxophone,Trombone,Tuba,Saxophone,Trombone,Tuba,Euphonium,Bagpipes,Saxophone,Trumpet,Saxophone,Trumpet,Trombone,Saxophone,Trumpet,Trombone,Euphonium,Saxophone,Tuba,Trombone,Trombone,Bagpipes,Trombone,Euphonium,Trombone,Other,Trombone,Tuba,Trombone,Tuba,Euphonium,Trumpet,Trumpet,Bagpipes,Trumpet,Euphonium,Trumpet,Euphonium,Other,Trumpet,French Horn,Trumpet,French Horn,Euphonium,Trumpet,French Horn,Other,Trumpet,French Horn,Trombone,Trumpet,French Horn,Trombone,Euphonium,Trumpet,French Horn,Trombone,Tuba,Euphonium,Trumpet,French Horn,Trombone,Tuba,Euphonium,Other,Trumpet,Other,Trumpet,Trombone,Trumpet,Trombone,Euphonium,Trumpet,Trombone,Euphonium,Other,Trumpet,Trombone,Tuba,Euphonium,Trumpet,Tuba,Trumpet,Tuba,Bagpipes,Trumpet,Tuba,Euphonium,Tuba,Tuba,Euphonium 1337 153 No (0.88556470 0.11443530)  
      4) dyspSymptoms=Air hunger,Air hunger,Breathing a lot/Unplanned breaths,Can't finish phrases,Air hunger,Can't finish phrases,Air hunger,Can't finish phrases,Other,Air hunger,Chest tightness,Air hunger,Chest tightness,Breathing a lot/Unplanned breaths,Air hunger,Chest tightness,Breathing a lot/Unplanned breaths,Can't finish phrases,Air hunger,Chest tightness,Can't finish phrases,Air hunger,Chest tightness,Mental breathing effort,Air hunger,Chest tightness,Mental breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases,Air hunger,Chest tightness,Mental breathing effort,Unplanned breaths,Air hunger,Chest tightness,Unplanned breaths,Air hunger,Chest tightness,Unplanned breaths,Can't finish phrases,Air hunger,Mental breathing effort,Air hunger,Mental breathing effort,Breathing a lot/Unplanned breaths,Air hunger,Mental breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases,Air hunger,Mental breathing effort,Can't finish phrases,Air hunger,Mental breathing effort,Unplanned breaths,Air hunger,Unplanned breaths,Breathing a lot/Unplanned breaths,Breathing a lot/Unplanned breaths,Can't finish phrases,Breathing a lot/Unplanned breaths,Other,Breathing discomfort,Air hunger,Breathing a lot/Unplanned breaths,Breathing discomfort,Air hunger,Breathing a lot/Unplanned breaths,Can't finish phrases,Breathing discomfort,Air hunger,Can't finish phrases,Breathing discomfort,Air hunger,Chest tightness,Breathing a lot/Unplanned breaths,Breathing discomfort,Air hunger,Chest tightness,Breathing a lot/Unplanned breaths,Can't finish phrases,Breathing discomfort,Air hunger,Chest tightness,Can't finish phrases,Breathing discomfort,Air hunger,Chest tightness,Mental breathing effort,Breathing discomfort,Air hunger,Chest tightness,Mental breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases,Breathing discomfort,Air hunger,Chest tightness,Mental breathing effort,Can't finish phrases,Breathing discomfort,Air hunger,Mental breathing effort,Breathing discomfort,Air hunger,Mental breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases,Breathing discomfort,Air hunger,Mental breathing effort,Can't finish phrases,Breathing discomfort,Air hunger,Mental breathing effort,Unplanned breaths,Can't finish phrases,Breathing discomfort,Air hunger,Other,Breathing discomfort,Air hunger,Unplanned breaths,Breathing discomfort,Breathing a lot/Unplanned breaths,Breathing discomfort,Breathing a lot/Unplanned breaths,Can't finish phrases,Breathing discomfort,Can't finish phrases,Breathing discomfort,Chest tightness,Breathing a lot/Unplanned breaths,Breathing discomfort,Chest tightness,Can't finish phrases,Breathing discomfort,Chest tightness,Mental breathing effort,Breathing discomfort,Chest tightness,Mental breathing effort,Breathing a lot/Unplanned breaths,Breathing discomfort,Chest tightness,Unplanned breaths,Can't finish phrases,Breathing discomfort,Mental breathing effort,Breathing discomfort,Mental breathing effort,Can't finish phrases,Breathing discomfort,Physical breathing effort,Air hunger,Breathing discomfort,Physical breathing effort,Air hunger,Breathing a lot/Unplanned breaths,Can't finish phrases,Breathing discomfort,Physical breathing effort,Air hunger,Chest tightness,Mental breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases,Breathing discomfort,Physical breathing effort,Air hunger,Chest tightness,Mental breathing effort,Can't finish phrases,Breathing discomfort,Physical breathing effort,Air hunger,Mental breathing effort,Unplanned breaths,Breathing discomfort,Physical breathing effort,Air hunger,Mental breathing effort,Unplanned breaths,Can't finish phrases,Breathing discomfort,Physical breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases,Breathing discomfort,Physical breathing effort,Chest tightness,Breathing a lot/Unplanned breaths,Breathing discomfort,Physical breathing effort,Chest tightness,Breathing a lot/Unplanned breaths,Can't finish phrases,Breathing discomfort,Physical breathing effort,Chest tightness,Can't finish phrases,Breathing discomfort,Physical breathing effort,Chest tightness,Mental breathing effort,Breathing discomfort,Physical breathing effort,Chest tightness,Mental breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases,Breathing discomfort,Physical breathing effort,Chest tightness,Unplanned breaths,Can't finish phrases,Breathing discomfort,Physical breathing effort,Mental breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases,Breathing discomfort,Physical breathing effort,Mental breathing effort,Unplanned breaths,Can't finish phrases,Breathing discomfort,Physical breathing effort,Unplanned breaths,Breathing discomfort,Unplanned breaths,Breathing discomfort,Unplanned breaths,Can't finish phrases,Breathlessness,Breathlessness,Air hunger,Breathlessness,Air hunger,Breathing a lot/Unplanned breaths,Breathlessness,Air hunger,Breathing a lot/Unplanned breaths,Can't finish phrases,Breathlessness,Air hunger,Breathing a lot/Unplanned breaths,Can't finish phrases,Other,Breathlessness,Air hunger,Can't finish phrases,Breathlessness,Air hunger,Can't finish phrases,Other,Breathlessness,Air hunger,Chest tightness,Breathlessness,Air hunger,Chest tightness,Breathing a lot/Unplanned breaths,Breathlessness,Air hunger,Chest tightness,Breathing a lot/Unplanned breaths,Other,Breathlessness,Air hunger,Chest tightness,Mental breathing effort,Breathlessness,Air hunger,Chest tightness,Mental breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases,Breathlessness,Air hunger,Chest tightness,Mental breathing effort,Can't finish phrases,Breathlessness,Air hunger,Chest tightness,Unplanned breaths,Breathlessness,Air hunger,Chest tightness,Unplanned breaths,Can't finish phrases,Breathlessness,Air hunger,Mental breathing effort,Breathlessness,Air hunger,Mental breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases,Breathlessness,Air hunger,Mental breathing effort,Breathing a lot/Unplanned breaths,Other,Breathlessness,Air hunger,Mental breathing effort,Can't finish phrases,Breathlessness,Air hunger,Unplanned breaths,Can't finish phrases,Breathlessness,Breathing a lot/Unplanned breaths,Breathlessness,Breathing a lot/Unplanned breaths,Can't finish phrases,Breathlessness,Breathing discomfort,Breathlessness,Breathing discomfort,Air hunger,Breathing a lot/Unplanned breaths,Breathlessness,Breathing discomfort,Air hunger,Breathing a lot/Unplanned breaths,Can't finish phrases,Breathlessness,Breathing discomfort,Air hunger,Can't finish phrases,Breathlessness,Breathing discomfort,Air hunger,Chest tightness,Breathlessness,Breathing discomfort,Air hunger,Chest tightness,Breathing a lot/Unplanned breaths,Breathlessness,Breathing discomfort,Air hunger,Chest tightness,Breathing a lot/Unplanned breaths,Can't finish phrases,Breathlessness,Breathing discomfort,Air hunger,Chest tightness,Can't finish phrases,Breathlessness,Breathing discomfort,Air hunger,Chest tightness,Mental breathing effort,Can't finish phrases,Breathlessness,Breathing discomfort,Air hunger,Chest tightness,Mental breathing effort,Unplanned breaths,Can't finish phrases,Breathlessness,Breathing discomfort,Air hunger,Chest tightness,Unplanned breaths,Can't finish phrases,Other,Breathlessness,Breathing discomfort,Air hunger,Mental breathing effort,Breathlessness,Breathing discomfort,Air hunger,Other,Breathlessness,Breathing discomfort,Air hunger,Unplanned breaths,Can't finish phrases,Breathlessness,Breathing discomfort,Breathing a lot/Unplanned breaths,Can't finish phrases,Breathlessness,Breathing discomfort,Can't finish phrases,Breathlessness,Breathing discomfort,Chest tightness,Breathlessness,Breathing discomfort,Chest tightness,Breathing a lot/Unplanned breaths,Breathlessness,Breathing discomfort,Chest tightness,Breathing a lot/Unplanned breaths,Can't finish phrases,Breathlessness,Breathing discomfort,Chest tightness,Can't finish phrases,Breathlessness,Breathing discomfort,Chest tightness,Mental breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases,Breathlessness,Breathing discomfort,Chest tightness,Mental breathing effort,Can't finish phrases,Breathlessness,Breathing discomfort,Chest tightness,Unplanned breaths,Breathlessness,Breathing discomfort,Mental breathing effort,Breathing a lot/Unplanned breaths,Breathlessness,Breathing discomfort,Mental breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases,Breathlessness,Breathing discomfort,Physical breathing effort,Breathlessness,Breathing discomfort,Physical breathing effort,Air hunger,Breathlessness,Breathing discomfort,Physical breathing effort,Air hunger,Breathing a lot/Unplanned breaths,Breathlessness,Breathing discomfort,Physical breathing effort,Air hunger,Breathing a lot/Unplanned breaths,Can't finish phrases,Breathlessness,Breathing discomfort,Physical breathing effort,Air hunger,Breathing a lot/Unplanned breaths,Can't finish phrases,Other,Breathlessness,Breathing discomfort,Physical breathing effort,Air hunger,Chest tightness,Breathlessness,Breathing discomfort,Physical breathing effort,Air hunger,Chest tightness,Breathing a lot/Unplanned breaths,Breathlessness,Breathing discomfort,Physical breathing effort,Air hunger,Chest tightness,Breathing a lot/Unplanned breaths,Can't finish phrases,Breathlessness,Breathing discomfort,Physical breathing effort,Air hunger,Chest tightness,Mental breathing effort,Breathlessness,Breathing discomfort,Physical breathing effort,Air hunger,Chest tightness,Mental breathing effort,Can't finish phrases,Breathlessness,Breathing discomfort,Physical breathing effort,Air hunger,Chest tightness,Unplanned breaths,Can't finish phrases,Breathlessness,Breathing discomfort,Physical breathing effort,Air hunger,Mental breathing effort,Breathing a lot/Unplanned breaths,Breathlessness,Breathing discomfort,Physical breathing effort,Air hunger,Mental breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases,Breathlessness,Breathing discomfort,Physical breathing effort,Air hunger,Mental breathing effort,Can't finish phrases,Breathlessness,Breathing discomfort,Physical breathing effort,Air hunger,Unplanned breaths,Can't finish phrases,Breathlessness,Breathing discomfort,Physical breathing effort,Breathing a lot/Unplanned breaths,Breathlessness,Breathing discomfort,Physical breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases,Breathlessness,Breathing discomfort,Physical breathing effort,Can't finish phrases,Breathlessness,Breathing discomfort,Physical breathing effort,Chest tightness,Breathlessness,Breathing discomfort,Physical breathing effort,Chest tightness,Breathing a lot/Unplanned breaths,Can't finish phrases,Breathlessness,Breathing discomfort,Physical breathing effort,Chest tightness,Mental breathing effort,Breathlessness,Breathing discomfort,Physical breathing effort,Chest tightness,Mental breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases,Breathlessness,Breathing discomfort,Physical breathing effort,Chest tightness,Mental breathing effort,Can't finish phrases,Breathlessness,Breathing discomfort,Physical breathing effort,Mental breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases,Breathlessness,Breathing discomfort,Physical breathing effort,Mental breathing effort,Can't finish phrases,Breathlessness,Breathing discomfort,Physical breathing effort,Unplanned breaths,Breathlessness,Breathing discomfort,Physical breathing effort,Unplanned breaths,Can't finish phrases,Breathlessness,Can't finish phrases,Breathlessness,Can't finish phrases,Other,Breathlessness,Chest tightness,Breathlessness,Chest tightness,Breathing a lot/Unplanned breaths,Breathlessness,Chest tightness,Breathing a lot/Unplanned breaths,Can't finish phrases,Breathlessness,Chest tightness,Can't finish phrases,Breathlessness,Chest tightness,Mental breathing effort,Breathlessness,Chest tightness,Unplanned breaths,Can't finish phrases,Breathlessness,Mental breathing effort,Breathlessness,Mental breathing effort,Breathing a lot/Unplanned breaths,Breathlessness,Mental breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases,Breathlessness,Mental breathing effort,Can't finish phrases,Breathlessness,Mental breathing effort,Unplanned breaths,Breathlessness,Mental breathing effort,Unplanned breaths,Can't finish phrases,Breathlessness,Other,Breathlessness,Physical breathing effort,Air hunger,Breathlessness,Physical breathing effort,Air hunger,Breathing a lot/Unplanned breaths,Breathlessness,Physical breathing effort,Air hunger,Breathing a lot/Unplanned breaths,Can't finish phrases,Breathlessness,Physical breathing effort,Air hunger,Can't finish phrases,Breathlessness,Physical breathing effort,Air hunger,Chest tightness,Breathing a lot/Unplanned breaths,Can't finish phrases,Breathlessness,Physical breathing effort,Air hunger,Chest tightness,Mental breathing effort,Can't finish phrases,Breathlessness,Physical breathing effort,Air hunger,Chest tightness,Unplanned breaths,Breathlessness,Physical breathing effort,Air hunger,Mental breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases,Breathlessness,Physical breathing effort,Air hunger,Mental breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases,Other,Breathlessness,Physical breathing effort,Air hunger,Mental breathing effort,Unplanned breaths,Can't finish phrases,Breathlessness,Physical breathing effort,Air hunger,Mental breathing effort,Unplanned breaths,Can't finish phrases,Other,Breathlessness,Physical breathing effort,Air hunger,Unplanned breaths,Can't finish phrases,Breathlessness,Physical breathing effort,Breathing a lot/Unplanned breaths,Breathlessness,Physical breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases,Breathlessness,Physical breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases,Other,Breathlessness,Physical breathing effort,Can't finish phrases,Breathlessness,Physical breathing effort,Chest tightness,Breathlessness,Physical breathing effort,Chest tightness,Can't finish phrases,Breathlessness,Physical breathing effort,Chest tightness,Unplanned breaths,Can't finish phrases,Breathlessness,Physical breathing effort,Mental breathing effort,Breathing a lot/Unplanned breaths,Breathlessness,Physical breathing effort,Mental breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases,Breathlessness,Physical breathing effort,Mental breathing effort,Can't finish phrases,Breathlessness,Physical breathing effort,Mental breathing effort,Unplanned breaths,Breathlessness,Physical breathing effort,Mental breathing effort,Unplanned breaths,Can't finish phrases,Breathlessness,Unplanned breaths,Breathlessness,Unplanned breaths,Can't finish phrases,Can't finish phrases,Can't finish phrases,Breathing discomfort,Can't finish phrases,Mental breathing effort,Can't finish phrases,Other,Can't finish phrases,Unplanned breaths,Chest tightness,Chest tightness,Breathing a lot/Unplanned breaths,Can't finish phrases,Chest tightness,Can't finish phrases,Chest tightness,Mental breathing effort,Chest tightness,Mental breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases,Chest tightness,Mental breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases,Other,Chest tightness,Mental breathing effort,Can't finish phrases,Chest tightness,Other,Chest tightness,Unplanned breaths,Mental breathing effort,Breathing a lot/Unplanned breaths,Mental breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases,Mental breathing effort,Can't finish phrases,Mental breathing effort,Can't finish phrases,Other,Mental breathing effort,Other,Misc/Unclear,None of the above,Other,Physical breathing effort,Physical breathing effort,Air hunger,Physical breathing effort,Air hunger,Breathing a lot/Unplanned breaths,Physical breathing effort,Air hunger,Breathing a lot/Unplanned breaths,Can't finish phrases,Physical breathing effort,Air hunger,Chest tightness,Physical breathing effort,Air hunger,Chest tightness,Can't finish phrases,Physical breathing effort,Air hunger,Chest tightness,Mental breathing effort,Physical breathing effort,Air hunger,Chest tightness,Mental breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases,Physical breathing effort,Air hunger,Chest tightness,Mental breathing effort,Can't finish phrases,Physical breathing effort,Air hunger,Mental breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases,Physical breathing effort,Air hunger,Mental breathing effort,Can't finish phrases,Physical breathing effort,Air hunger,Mental breathing effort,Unplanned breaths,Can't finish phrases,Physical breathing effort,Air hunger,Unplanned breaths,Physical breathing effort,Air hunger,Unplanned breaths,Can't finish phrases,Physical breathing effort,Breathing a lot/Unplanned breaths,Physical breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases,Physical breathing effort,Breathing a lot/Unplanned breaths,Other,Physical breathing effort,Can't finish phrases,Physical breathing effort,Can't finish phrases,Other,Physical breathing effort,Chest tightness,Breathing a lot/Unplanned breaths,Physical breathing effort,Chest tightness,Breathing a lot/Unplanned breaths,Can't finish phrases,Physical breathing effort,Chest tightness,Can't finish phrases,Physical breathing effort,Chest tightness,Mental breathing effort,Physical breathing effort,Chest tightness,Mental breathing effort,Can't finish phrases,Physical breathing effort,Chest tightness,Unplanned breaths,Can't finish phrases,Physical breathing effort,Mental breathing effort,Physical breathing effort,Mental breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases,Physical breathing effort,Mental breathing effort,Can't finish phrases,Physical breathing effort,Mental breathing effort,Other,Physical breathing effort,Mental breathing effort,Unplanned breaths,Physical breathing effort,Mental breathing effort,Unplanned breaths,Can't finish phrases,Physical breathing effort,Other,Physical breathing effort,Unplanned breaths,Can't finish phrases,Other,Unplanned breaths,Unplanned breaths,Can't finish phrases 1064  62 No (0.94172932 0.05827068)  
        8) influences=Music school ed,Music school ed,Medical practitioner,Music school ed,Non-musical education,Music school ed,Personal research,Music school ed,Personal research,Non-musical education,Music teacher(s),Music teacher(s),Medical practitioner,Music teacher(s),Medical practitioner,Non-musical education,Music teacher(s),Medical practitioner,Personal research,Music teacher(s),Music school ed,Music teacher(s),Music school ed,Medical practitioner,Music teacher(s),Music school ed,Medical practitioner,Personal research,Music teacher(s),Music school ed,Non-musical education,Music teacher(s),Music school ed,Non-musical education,Medical practitioner,Personal research,Music teacher(s),Music school ed,Personal research,Music teacher(s),Music school ed,Personal research,Non-musical education,Music teacher(s),Non-musical education,Music teacher(s),Non-musical education,Medical practitioner,Music teacher(s),Non-musical education,Medical practitioner,Personal research,Music teacher(s),Non-musical education,Medical practitioner,Personal research,Other,Music teacher(s),Non-musical education,Other,Music teacher(s),Non-musical education,Personal research,Music teacher(s),Other,Music teacher(s),Personal research,Music teacher(s),Personal research,Other,Music teacher(s),Wind instrumentalist peers,Music teacher(s),Wind instrumentalist peers,Medical practitioner,Music teacher(s),Wind instrumentalist peers,Medical practitioner,Personal research,Music teacher(s),Wind instrumentalist peers,Music school ed,Music teacher(s),Wind instrumentalist peers,Music school ed,Medical practitioner,Music teacher(s),Wind instrumentalist peers,Music school ed,Non-musical education,Music teacher(s),Wind instrumentalist peers,Music school ed,Non-musical education,Medical practitioner,Music teacher(s),Wind instrumentalist peers,Music school ed,Non-musical education,Personal research,Music teacher(s),Wind instrumentalist peers,Music school ed,Other,Music teacher(s),Wind instrumentalist peers,Music school ed,Personal research,Music teacher(s),Wind instrumentalist peers,Music school ed,Personal research,Other,Music teacher(s),Wind instrumentalist peers,Non-musical education,Music teacher(s),Wind instrumentalist peers,Non-musical education,Medical practitioner,Music teacher(s),Wind instrumentalist peers,Non-musical education,Other,Music teacher(s),Wind instrumentalist peers,Non-musical education,Personal research,Music teacher(s),Wind instrumentalist peers,Personal research,Medical practitioner,Music teacher(s),Wind instrumentalist peers,Personal research,Non-musical education,Music teacher(s),Wind instrumentalist peers,Personal research,Non-musical education,Other,Music teacher(s),Wind instrumentalist peers,Personal research,Other,Non-musical education,Non-musical education,Medical practitioner,Non-musical education,Medical practitioner,Personal research,Non-musical education,Other,Non-musical education,Personal research,Non-musical education,Personal research,Other,Not sure,Other,Personal research,Personal research,Non-musical education,Wind instrumentalist peers,Wind instrumentalist peers,Medical practitioner,Personal research,Wind instrumentalist peers,Music school ed,Wind instrumentalist peers,Music school ed,Medical practitioner,Wind instrumentalist peers,Music school ed,Non-musical education,Personal research,Wind instrumentalist peers,Music school ed,Personal research,Wind instrumentalist peers,Non-musical education,Medical practitioner,Wind instrumentalist peers,Non-musical education,Medical practitioner,Personal research,Wind instrumentalist peers,Non-musical education,Personal research,Wind instrumentalist peers,Personal research 950  31 No (0.96736842 0.03263158)  
         16) dyspSymptoms=Air hunger,Air hunger,Can't finish phrases,Other,Air hunger,Chest tightness,Air hunger,Chest tightness,Breathing a lot/Unplanned breaths,Air hunger,Chest tightness,Breathing a lot/Unplanned breaths,Can't finish phrases,Air hunger,Chest tightness,Can't finish phrases,Air hunger,Chest tightness,Mental breathing effort,Air hunger,Chest tightness,Mental breathing effort,Unplanned breaths,Air hunger,Chest tightness,Unplanned breaths,Air hunger,Chest tightness,Unplanned breaths,Can't finish phrases,Air hunger,Mental breathing effort,Air hunger,Mental breathing effort,Breathing a lot/Unplanned breaths,Air hunger,Mental breathing effort,Can't finish phrases,Air hunger,Mental breathing effort,Unplanned breaths,Air hunger,Unplanned breaths,Breathing a lot/Unplanned breaths,Breathing a lot/Unplanned breaths,Can't finish phrases,Breathing a lot/Unplanned breaths,Other,Breathing discomfort,Air hunger,Breathing a lot/Unplanned breaths,Breathing discomfort,Air hunger,Breathing a lot/Unplanned breaths,Can't finish phrases,Breathing discomfort,Air hunger,Can't finish phrases,Breathing discomfort,Air hunger,Chest tightness,Breathing a lot/Unplanned breaths,Breathing discomfort,Air hunger,Chest tightness,Can't finish phrases,Breathing discomfort,Air hunger,Chest tightness,Mental breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases,Breathing discomfort,Air hunger,Chest tightness,Mental breathing effort,Can't finish phrases,Breathing discomfort,Air hunger,Mental breathing effort,Breathing discomfort,Air hunger,Mental breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases,Breathing discomfort,Air hunger,Mental breathing effort,Can't finish phrases,Breathing discomfort,Air hunger,Mental breathing effort,Unplanned breaths,Can't finish phrases,Breathing discomfort,Air hunger,Other,Breathing discomfort,Air hunger,Unplanned breaths,Breathing discomfort,Breathing a lot/Unplanned breaths,Breathing discomfort,Breathing a lot/Unplanned breaths,Can't finish phrases,Breathing discomfort,Can't finish phrases,Breathing discomfort,Chest tightness,Breathing a lot/Unplanned breaths,Breathing discomfort,Chest tightness,Can't finish phrases,Breathing discomfort,Chest tightness,Mental breathing effort,Breathing discomfort,Chest tightness,Mental breathing effort,Breathing a lot/Unplanned breaths,Breathing discomfort,Chest tightness,Unplanned breaths,Can't finish phrases,Breathing discomfort,Mental breathing effort,Breathing discomfort,Mental breathing effort,Can't finish phrases,Breathing discomfort,Physical breathing effort,Air hunger,Breathing discomfort,Physical breathing effort,Air hunger,Breathing a lot/Unplanned breaths,Can't finish phrases,Breathing discomfort,Physical breathing effort,Air hunger,Chest tightness,Mental breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases,Breathing discomfort,Physical breathing effort,Air hunger,Chest tightness,Mental breathing effort,Can't finish phrases,Breathing discomfort,Physical breathing effort,Air hunger,Mental breathing effort,Unplanned breaths,Can't finish phrases,Breathing discomfort,Physical breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases,Breathing discomfort,Physical breathing effort,Chest tightness,Breathing a lot/Unplanned breaths,Breathing discomfort,Physical breathing effort,Chest tightness,Breathing a lot/Unplanned breaths,Can't finish phrases,Breathing discomfort,Physical breathing effort,Chest tightness,Can't finish phrases,Breathing discomfort,Physical breathing effort,Chest tightness,Mental breathing effort,Breathing discomfort,Physical breathing effort,Chest tightness,Mental breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases,Breathing discomfort,Physical breathing effort,Chest tightness,Unplanned breaths,Can't finish phrases,Breathing discomfort,Physical breathing effort,Mental breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases,Breathing discomfort,Physical breathing effort,Mental breathing effort,Unplanned breaths,Can't finish phrases,Breathing discomfort,Physical breathing effort,Unplanned breaths,Breathing discomfort,Unplanned breaths,Breathlessness,Breathlessness,Air hunger,Breathlessness,Air hunger,Breathing a lot/Unplanned breaths,Breathlessness,Air hunger,Breathing a lot/Unplanned breaths,Can't finish phrases,Breathlessness,Air hunger,Breathing a lot/Unplanned breaths,Can't finish phrases,Other,Breathlessness,Air hunger,Can't finish phrases,Breathlessness,Air hunger,Can't finish phrases,Other,Breathlessness,Air hunger,Chest tightness,Breathlessness,Air hunger,Chest tightness,Breathing a lot/Unplanned breaths,Breathlessness,Air hunger,Chest tightness,Breathing a lot/Unplanned breaths,Other,Breathlessness,Air hunger,Chest tightness,Mental breathing effort,Breathlessness,Air hunger,Chest tightness,Mental breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases,Breathlessness,Air hunger,Chest tightness,Mental breathing effort,Can't finish phrases,Breathlessness,Air hunger,Chest tightness,Unplanned breaths,Breathlessness,Air hunger,Chest tightness,Unplanned breaths,Can't finish phrases,Breathlessness,Air hunger,Mental breathing effort,Breathlessness,Air hunger,Mental breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases,Breathlessness,Air hunger,Mental breathing effort,Breathing a lot/Unplanned breaths,Other,Breathlessness,Air hunger,Mental breathing effort,Can't finish phrases,Breathlessness,Breathing a lot/Unplanned breaths,Breathlessness,Breathing a lot/Unplanned breaths,Can't finish phrases,Breathlessness,Breathing discomfort,Breathlessness,Breathing discomfort,Air hunger,Breathing a lot/Unplanned breaths,Breathlessness,Breathing discomfort,Air hunger,Breathing a lot/Unplanned breaths,Can't finish phrases,Breathlessness,Breathing discomfort,Air hunger,Can't finish phrases,Breathlessness,Breathing discomfort,Air hunger,Chest tightness,Breathlessness,Breathing discomfort,Air hunger,Chest tightness,Breathing a lot/Unplanned breaths,Breathlessness,Breathing discomfort,Air hunger,Chest tightness,Mental breathing effort,Can't finish phrases,Breathlessness,Breathing discomfort,Air hunger,Chest tightness,Unplanned breaths,Can't finish phrases,Other,Breathlessness,Breathing discomfort,Air hunger,Mental breathing effort,Breathlessness,Breathing discomfort,Air hunger,Other,Breathlessness,Breathing discomfort,Air hunger,Unplanned breaths,Can't finish phrases,Breathlessness,Breathing discomfort,Breathing a lot/Unplanned breaths,Can't finish phrases,Breathlessness,Breathing discomfort,Can't finish phrases,Breathlessness,Breathing discomfort,Chest tightness,Breathlessness,Breathing discomfort,Chest tightness,Breathing a lot/Unplanned breaths,Breathlessness,Breathing discomfort,Chest tightness,Breathing a lot/Unplanned breaths,Can't finish phrases,Breathlessness,Breathing discomfort,Chest tightness,Can't finish phrases,Breathlessness,Breathing discomfort,Chest tightness,Mental breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases,Breathlessness,Breathing discomfort,Chest tightness,Mental breathing effort,Can't finish phrases,Breathlessness,Breathing discomfort,Chest tightness,Unplanned breaths,Breathlessness,Breathing discomfort,Mental breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases,Breathlessness,Breathing discomfort,Physical breathing effort,Breathlessness,Breathing discomfort,Physical breathing effort,Air hunger,Breathlessness,Breathing discomfort,Physical breathing effort,Air hunger,Breathing a lot/Unplanned breaths,Breathlessness,Breathing discomfort,Physical breathing effort,Air hunger,Breathing a lot/Unplanned breaths,Can't finish phrases,Breathlessness,Breathing discomfort,Physical breathing effort,Air hunger,Breathing a lot/Unplanned breaths,Can't finish phrases,Other,Breathlessness,Breathing discomfort,Physical breathing effort,Air hunger,Chest tightness,Breathlessness,Breathing discomfort,Physical breathing effort,Air hunger,Chest tightness,Breathing a lot/Unplanned breaths,Breathlessness,Breathing discomfort,Physical breathing effort,Air hunger,Chest tightness,Breathing a lot/Unplanned breaths,Can't finish phrases,Breathlessness,Breathing discomfort,Physical breathing effort,Air hunger,Chest tightness,Mental breathing effort,Breathlessness,Breathing discomfort,Physical breathing effort,Air hunger,Chest tightness,Mental breathing effort,Can't finish phrases,Breathlessness,Breathing discomfort,Physical breathing effort,Air hunger,Chest tightness,Unplanned breaths,Can't finish phrases,Breathlessness,Breathing discomfort,Physical breathing effort,Air hunger,Mental breathing effort,Breathing a lot/Unplanned breaths,Breathlessness,Breathing discomfort,Physical breathing effort,Air hunger,Unplanned breaths,Can't finish phrases,Breathlessness,Breathing discomfort,Physical breathing effort,Breathing a lot/Unplanned breaths,Breathlessness,Breathing discomfort,Physical breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases,Breathlessness,Breathing discomfort,Physical breathing effort,Can't finish phrases,Breathlessness,Breathing discomfort,Physical breathing effort,Chest tightness,Breathing a lot/Unplanned breaths,Can't finish phrases,Breathlessness,Breathing discomfort,Physical breathing effort,Chest tightness,Mental breathing effort,Breathlessness,Breathing discomfort,Physical breathing effort,Chest tightness,Mental breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases,Breathlessness,Breathing discomfort,Physical breathing effort,Chest tightness,Mental breathing effort,Can't finish phrases,Breathlessness,Breathing discomfort,Physical breathing effort,Mental breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases,Breathlessness,Breathing discomfort,Physical breathing effort,Unplanned breaths,Breathlessness,Breathing discomfort,Physical breathing effort,Unplanned breaths,Can't finish phrases,Breathlessness,Can't finish phrases,Other,Breathlessness,Chest tightness,Breathlessness,Chest tightness,Breathing a lot/Unplanned breaths,Breathlessness,Chest tightness,Breathing a lot/Unplanned breaths,Can't finish phrases,Breathlessness,Chest tightness,Can't finish phrases,Breathlessness,Chest tightness,Unplanned breaths,Can't finish phrases,Breathlessness,Mental breathing effort,Breathlessness,Mental breathing effort,Breathing a lot/Unplanned breaths,Breathlessness,Mental breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases,Breathlessness,Mental breathing effort,Can't finish phrases,Breathlessness,Mental breathing effort,Unplanned breaths,Breathlessness,Mental breathing effort,Unplanned breaths,Can't finish phrases,Breathlessness,Other,Breathlessness,Physical breathing effort,Air hunger,Breathlessness,Physical breathing effort,Air hunger,Breathing a lot/Unplanned breaths,Breathlessness,Physical breathing effort,Air hunger,Breathing a lot/Unplanned breaths,Can't finish phrases,Breathlessness,Physical breathing effort,Air hunger,Can't finish phrases,Breathlessness,Physical breathing effort,Air hunger,Chest tightness,Breathing a lot/Unplanned breaths,Can't finish phrases,Breathlessness,Physical breathing effort,Air hunger,Chest tightness,Mental breathing effort,Can't finish phrases,Breathlessness,Physical breathing effort,Air hunger,Chest tightness,Unplanned breaths,Breathlessness,Physical breathing effort,Air hunger,Mental breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases,Breathlessness,Physical breathing effort,Air hunger,Mental breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases,Other,Breathlessness,Physical breathing effort,Air hunger,Mental breathing effort,Unplanned breaths,Can't finish phrases,Breathlessness,Physical breathing effort,Air hunger,Mental breathing effort,Unplanned breaths,Can't finish phrases,Other,Breathlessness,Physical breathing effort,Air hunger,Unplanned breaths,Can't finish phrases,Breathlessness,Physical breathing effort,Breathing a lot/Unplanned breaths,Breathlessness,Physical breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases,Breathlessness,Physical breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases,Other,Breathlessness,Physical breathing effort,Can't finish phrases,Breathlessness,Physical breathing effort,Chest tightness,Breathlessness,Physical breathing effort,Chest tightness,Can't finish phrases,Breathlessness,Physical breathing effort,Chest tightness,Unplanned breaths,Can't finish phrases,Breathlessness,Physical breathing effort,Mental breathing effort,Breathing a lot/Unplanned breaths,Breathlessness,Physical breathing effort,Mental breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases,Breathlessness,Physical breathing effort,Mental breathing effort,Can't finish phrases,Breathlessness,Physical breathing effort,Mental breathing effort,Unplanned breaths,Breathlessness,Physical breathing effort,Mental breathing effort,Unplanned breaths,Can't finish phrases,Breathlessness,Unplanned breaths,Can't finish phrases,Can't finish phrases,Breathing discomfort,Can't finish phrases,Other,Can't finish phrases,Unplanned breaths,Chest tightness,Chest tightness,Breathing a lot/Unplanned breaths,Can't finish phrases,Chest tightness,Mental breathing effort,Chest tightness,Mental breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases,Chest tightness,Mental breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases,Other,Chest tightness,Mental breathing effort,Can't finish phrases,Chest tightness,Unplanned breaths,Mental breathing effort,Breathing a lot/Unplanned breaths,Mental breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases,Mental breathing effort,Can't finish phrases,Mental breathing effort,Can't finish phrases,Other,Mental breathing effort,Other,Misc/Unclear,Other,Physical breathing effort,Air hunger,Breathing a lot/Unplanned breaths,Physical breathing effort,Air hunger,Breathing a lot/Unplanned breaths,Can't finish phrases,Physical breathing effort,Air hunger,Chest tightness,Physical breathing effort,Air hunger,Chest tightness,Can't finish phrases,Physical breathing effort,Air hunger,Chest tightness,Mental breathing effort,Physical breathing effort,Air hunger,Chest tightness,Mental breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases,Physical breathing effort,Air hunger,Chest tightness,Mental breathing effort,Can't finish phrases,Physical breathing effort,Air hunger,Mental breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases,Physical breathing effort,Air hunger,Mental breathing effort,Can't finish phrases,Physical breathing effort,Air hunger,Mental breathing effort,Unplanned breaths,Can't finish phrases,Physical breathing effort,Air hunger,Unplanned breaths,Can't finish phrases,Physical breathing effort,Breathing a lot/Unplanned breaths,Physical breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases,Physical breathing effort,Breathing a lot/Unplanned breaths,Other,Physical breathing effort,Can't finish phrases,Physical breathing effort,Can't finish phrases,Other,Physical breathing effort,Chest tightness,Breathing a lot/Unplanned breaths,Physical breathing effort,Chest tightness,Breathing a lot/Unplanned breaths,Can't finish phrases,Physical breathing effort,Chest tightness,Can't finish phrases,Physical breathing effort,Chest tightness,Mental breathing effort,Physical breathing effort,Chest tightness,Mental breathing effort,Can't finish phrases,Physical breathing effort,Chest tightness,Unplanned breaths,Can't finish phrases,Physical breathing effort,Mental breathing effort,Physical breathing effort,Mental breathing effort,Other,Physical breathing effort,Mental breathing effort,Unplanned breaths,Can't finish phrases,Physical breathing effort,Other,Unplanned breaths,Can't finish phrases 769  10 No (0.98699610 0.01300390) *
         17) dyspSymptoms=Air hunger,Breathing a lot/Unplanned breaths,Can't finish phrases,Air hunger,Can't finish phrases,Air hunger,Mental breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases,Breathlessness,Air hunger,Unplanned breaths,Can't finish phrases,Breathlessness,Breathing discomfort,Air hunger,Chest tightness,Breathing a lot/Unplanned breaths,Can't finish phrases,Breathlessness,Breathing discomfort,Physical breathing effort,Air hunger,Mental breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases,Breathlessness,Can't finish phrases,Breathlessness,Unplanned breaths,Can't finish phrases,Chest tightness,Can't finish phrases,Physical breathing effort,Physical breathing effort,Air hunger,Physical breathing effort,Mental breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases,Physical breathing effort,Mental breathing effort,Can't finish phrases,Unplanned breaths 181  21 No (0.88397790 0.11602210)  
           34) WI=Bassoon,Bassoon,Saxophone,Clarinet,Clarinet,Bagpipes,Clarinet,Flute,Saxophone,Other,Clarinet,Saxophone,Clarinet,Trumpet,Clarinet,Trumpet,French Horn,Clarinet,Trumpet,Other,Euphonium,Flute,Flute,Clarinet,Flute,Clarinet,Saxophone,Trumpet,Flute,Clarinet,Saxophone,Trumpet,French Horn/Horn,Other,Flute,Clarinet,Trumpet,Tuba,Other,Flute,Piccolo,Flute,Piccolo,Clarinet,Bassoon,Saxophone,Flute,Piccolo,Oboe/Cor Anglais,Clarinet,Saxophone,Flute,Piccolo,Recorder,Flute,Piccolo,Recorder,Oboe/Cor Anglais,Bassoon,French Horn,Flute,Piccolo,Recorder,Saxophone,Flute,Piccolo,Saxophone,Flute,Piccolo,Trumpet,Flute,Recorder,Flute,Recorder,Clarinet,Saxophone,Flute,Recorder,Clarinet,Trumpet,Flute,Recorder,Saxophone,Flute,Saxophone,Flute,Saxophone,Trombone,Flute,Trombone,Other,Oboe/Cor Anglais,Oboe/Cor Anglais,Clarinet,Piccolo,Piccolo,Bagpipes,Piccolo,Saxophone,Recorder,Recorder,Clarinet,Recorder,Clarinet,Other,Recorder,Saxophone,Recorder,Trumpet,Recorder,Trumpet,Trombone,Saxophone,Trombone,Bagpipes,Trombone,Other,Trumpet,Euphonium,Trumpet,French Horn,Trumpet,Trombone,Trumpet,Trombone,Tuba,Euphonium,Trumpet,Tuba,Tuba,Euphonium 122   2 No (0.98360656 0.01639344) *
           35) WI=Bagpipes,Flute,Clarinet,Saxophone,French Horn,Other,Piccolo,Trumpet,Bagpipes,Trombone,Trombone,Euphonium,Trumpet,Trumpet,French Horn,Trombone,Tuba,Euphonium,Tuba 59  19 No (0.67796610 0.32203390)  
             70) bodyImportant_diaphragm=Extremely important,Not at all important,Slightly important 34   5 No (0.85294118 0.14705882) *
             71) bodyImportant_diaphragm=Moderately important,Unsure,Very important 25  11 Yes (0.44000000 0.56000000)  
              142) RMTImprovePerf=Neither agree nor disagree,Somewhat agree,Somewhat disagree,Unsure 12   3 No (0.75000000 0.25000000) *
              143) RMTImprovePerf=Strongly agree 13   2 Yes (0.15384615 0.84615385) *
        9) influences=Medical practitioner,Medical practitioner,Personal research,Music school ed,Medical practitioner,Personal research,Music school ed,Non-musical education,Personal research,Music teacher(s),Music school ed,Other,Music teacher(s),Wind instrumentalist peers,Music school ed,Medical practitioner,Personal research,Music teacher(s),Wind instrumentalist peers,Music school ed,Medical practitioner,Personal research,Other,Music teacher(s),Wind instrumentalist peers,Music school ed,Non-musical education,Medical practitioner,Personal research,Music teacher(s),Wind instrumentalist peers,Non-musical education,Medical practitioner,Personal research,Music teacher(s),Wind instrumentalist peers,Personal research,Wind instrumentalist peers,Medical practitioner,Wind instrumentalist peers,Music school ed,Medical practitioner,Personal research,Wind instrumentalist peers,Non-musical education,Wind instrumentalist peers,Non-musical education,Other 114  31 No (0.72807018 0.27192982)  
         18) dyspSymptoms=Air hunger,Breathing a lot/Unplanned breaths,Can't finish phrases,Air hunger,Chest tightness,Can't finish phrases,Air hunger,Chest tightness,Mental breathing effort,Air hunger,Chest tightness,Mental breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases,Air hunger,Mental breathing effort,Breathing a lot/Unplanned breaths,Air hunger,Mental breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases,Air hunger,Mental breathing effort,Can't finish phrases,Breathing a lot/Unplanned breaths,Can't finish phrases,Breathing discomfort,Air hunger,Can't finish phrases,Breathing discomfort,Air hunger,Chest tightness,Breathing a lot/Unplanned breaths,Can't finish phrases,Breathing discomfort,Air hunger,Chest tightness,Mental breathing effort,Breathing discomfort,Can't finish phrases,Breathing discomfort,Physical breathing effort,Air hunger,Mental breathing effort,Unplanned breaths,Breathing discomfort,Physical breathing effort,Mental breathing effort,Unplanned breaths,Can't finish phrases,Breathing discomfort,Unplanned breaths,Can't finish phrases,Breathlessness,Air hunger,Breathing a lot/Unplanned breaths,Can't finish phrases,Breathlessness,Air hunger,Can't finish phrases,Breathlessness,Air hunger,Chest tightness,Mental breathing effort,Can't finish phrases,Breathlessness,Air hunger,Mental breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases,Breathlessness,Air hunger,Mental breathing effort,Can't finish phrases,Breathlessness,Air hunger,Unplanned breaths,Can't finish phrases,Breathlessness,Breathing a lot/Unplanned breaths,Can't finish phrases,Breathlessness,Breathing discomfort,Air hunger,Chest tightness,Breathing a lot/Unplanned breaths,Breathlessness,Breathing discomfort,Air hunger,Chest tightness,Can't finish phrases,Breathlessness,Breathing discomfort,Air hunger,Chest tightness,Mental breathing effort,Unplanned breaths,Can't finish phrases,Breathlessness,Breathing discomfort,Mental breathing effort,Breathing a lot/Unplanned breaths,Breathlessness,Breathing discomfort,Physical breathing effort,Air hunger,Breathing a lot/Unplanned breaths,Breathlessness,Breathing discomfort,Physical breathing effort,Air hunger,Breathing a lot/Unplanned breaths,Can't finish phrases,Breathlessness,Breathing discomfort,Physical breathing effort,Air hunger,Chest tightness,Breathing a lot/Unplanned breaths,Can't finish phrases,Breathlessness,Breathing discomfort,Physical breathing effort,Air hunger,Mental breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases,Breathlessness,Breathing discomfort,Physical breathing effort,Air hunger,Mental breathing effort,Can't finish phrases,Breathlessness,Breathing discomfort,Physical breathing effort,Chest tightness,Breathlessness,Breathing discomfort,Physical breathing effort,Chest tightness,Breathing a lot/Unplanned breaths,Can't finish phrases,Breathlessness,Breathing discomfort,Physical breathing effort,Mental breathing effort,Can't finish phrases,Breathlessness,Chest tightness,Breathlessness,Chest tightness,Mental breathing effort,Breathlessness,Chest tightness,Unplanned breaths,Can't finish phrases,Breathlessness,Mental breathing effort,Breathing a lot/Unplanned breaths,Breathlessness,Physical breathing effort,Air hunger,Mental breathing effort,Unplanned breaths,Can't finish phrases,Breathlessness,Physical breathing effort,Can't finish phrases,Breathlessness,Physical breathing effort,Mental breathing effort,Breathing a lot/Unplanned breaths,Breathlessness,Physical breathing effort,Mental breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases,Can't finish phrases,Mental breathing effort,Chest tightness,Other,None of the above,Physical breathing effort,Air hunger,Physical breathing effort,Air hunger,Mental breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases,Physical breathing effort,Air hunger,Mental breathing effort,Unplanned breaths,Can't finish phrases,Physical breathing effort,Air hunger,Unplanned breaths,Physical breathing effort,Air hunger,Unplanned breaths,Can't finish phrases,Physical breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases,Physical breathing effort,Chest tightness,Breathing a lot/Unplanned breaths,Physical breathing effort,Mental breathing effort,Can't finish phrases,Physical breathing effort,Mental breathing effort,Unplanned breaths,Physical breathing effort,Unplanned breaths,Can't finish phrases,Other 72   3 No (0.95833333 0.04166667) *
         19) dyspSymptoms=Air hunger,Air hunger,Can't finish phrases,Air hunger,Chest tightness,Air hunger,Mental breathing effort,Breathing a lot/Unplanned breaths,Breathlessness,Breathlessness,Breathing a lot/Unplanned breaths,Breathlessness,Breathing discomfort,Air hunger,Chest tightness,Breathing a lot/Unplanned breaths,Can't finish phrases,Breathlessness,Breathing discomfort,Chest tightness,Breathlessness,Can't finish phrases,Breathlessness,Physical breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases,Breathlessness,Unplanned breaths,Can't finish phrases,Can't finish phrases,Chest tightness,Mental breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases,Mental breathing effort,Can't finish phrases,Physical breathing effort,Unplanned breaths,Can't finish phrases 42  14 Yes (0.33333333 0.66666667)  
           38) WI=Clarinet,Euphonium,Flute,Flute,Recorder,Clarinet,Saxophone,Bagpipes,Oboe/Cor Anglais,Oboe/Cor Anglais,Bassoon,Recorder,Clarinet,Saxophone,Trombone,Tuba,Euphonium,Bagpipes,Trumpet,Trombone 14   3 No (0.78571429 0.21428571) *
           39) WI=Bassoon,Clarinet,Saxophone,Flute,Clarinet,Saxophone,Flute,Piccolo,Flute,Piccolo,Clarinet,Saxophone,Flute,Piccolo,Oboe/Cor Anglais,Clarinet,Bassoon,Saxophone,French Horn,Oboe/Cor Anglais,Clarinet,Saxophone,Saxophone,French Horn,Trombone,Trombone,Tuba,Euphonium,Trumpet,Tuba,Tuba,Euphonium 28   3 Yes (0.10714286 0.89285714) *
      5) dyspSymptoms=Air hunger,Breathing a lot/Unplanned breaths,Air hunger,Unplanned breaths,Can't finish phrases,Breathing discomfort,Breathing discomfort,Air hunger,Breathing discomfort,Air hunger,Chest tightness,Breathing discomfort,Chest tightness,Breathing discomfort,Chest tightness,Unplanned breaths,Breathing discomfort,Physical breathing effort,Breathing discomfort,Physical breathing effort,Air hunger,Chest tightness,Mental breathing effort,Unplanned breaths,Can't finish phrases,Breathing discomfort,Physical breathing effort,Air hunger,Mental breathing effort,Breathing discomfort,Physical breathing effort,Breathing a lot/Unplanned breaths,Breathing discomfort,Physical breathing effort,Can't finish phrases,Breathing discomfort,Physical breathing effort,Chest tightness,Breathing discomfort,Physical breathing effort,Chest tightness,Mental breathing effort,Unplanned breaths,Can't finish phrases,Breathing discomfort,Physical breathing effort,Chest tightness,Unplanned breaths,Breathing discomfort,Physical breathing effort,Mental breathing effort,Breathing a lot/Unplanned breaths,Breathing discomfort,Physical breathing effort,Mental breathing effort,Can't finish phrases,Breathlessness,Air hunger,Chest tightness,Breathing a lot/Unplanned breaths,Can't finish phrases,Breathlessness,Air hunger,Chest tightness,Can't finish phrases,Breathlessness,Breathing a lot/Unplanned breaths,Can't finish phrases,Other,Breathlessness,Breathing discomfort,Air hunger,Chest tightness,Mental breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases,Breathlessness,Breathing discomfort,Air hunger,Chest tightness,Unplanned breaths,Can't finish phrases,Breathlessness,Breathing discomfort,Air hunger,Mental breathing effort,Unplanned breaths,Can't finish phrases,Breathlessness,Breathing discomfort,Chest tightness,Unplanned breaths,Can't finish phrases,Breathlessness,Breathing discomfort,Mental breathing effort,Can't finish phrases,Breathlessness,Breathing discomfort,Physical breathing effort,Air hunger,Can't finish phrases,Breathlessness,Breathing discomfort,Physical breathing effort,Air hunger,Chest tightness,Can't finish phrases,Breathlessness,Breathing discomfort,Physical breathing effort,Air hunger,Chest tightness,Mental breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases,Breathlessness,Breathing discomfort,Physical breathing effort,Air hunger,Chest tightness,Mental breathing effort,Unplanned breaths,Can't finish phrases,Breathlessness,Breathing discomfort,Physical breathing effort,Air hunger,Mental breathing effort,Unplanned breaths,Can't finish phrases,Breathlessness,Breathing discomfort,Physical breathing effort,Chest tightness,Mental breathing effort,Unplanned breaths,Can't finish phrases,Breathlessness,Breathing discomfort,Physical breathing effort,Mental breathing effort,Breathlessness,Breathing discomfort,Unplanned breaths,Can't finish phrases,Breathlessness,Physical breathing effort,Breathlessness,Physical breathing effort,Air hunger,Chest tightness,Breathlessness,Physical breathing effort,Air hunger,Chest tightness,Breathing a lot/Unplanned breaths,Can't finish phrases,Other,Breathlessness,Physical breathing effort,Air hunger,Chest tightness,Mental breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases,Breathlessness,Physical breathing effort,Air hunger,Chest tightness,Mental breathing effort,Unplanned breaths,Can't finish phrases,Breathlessness,Physical breathing effort,Air hunger,Chest tightness,Unplanned breaths,Can't finish phrases,Breathlessness,Physical breathing effort,Air hunger,Mental breathing effort,Can't finish phrases,Breathlessness,Physical breathing effort,Chest tightness,Breathing a lot/Unplanned breaths,Can't finish phrases,Breathlessness,Physical breathing effort,Chest tightness,Mental breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases,Breathlessness,Physical breathing effort,Unplanned breaths,Can't finish phrases,Chest tightness,Breathing a lot/Unplanned breaths,Mental breathing effort,Mental breathing effort,Unplanned breaths,Can't finish phrases,Physical breathing effort,Air hunger,Can't finish phrases,Physical breathing effort,Air hunger,Mental breathing effort,Physical breathing effort,Chest tightness,Physical breathing effort,Chest tightness,Mental breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases,Physical breathing effort,Unplanned breaths,Can't finish phrases 273  91 No (0.66666667 0.33333333)  
       10) WI=Bagpipes,Clarinet,Clarinet,Bassoon,Saxophone,Clarinet,Flute,Recorder,Saxophone,Clarinet,Saxophone,Euphonium,Clarinet,Saxophone,Other,Clarinet,Saxophone,Trombone,Clarinet,Saxophone,Tuba,Clarinet,Trumpet,Trombone,Clarinet,Trumpet,Trombone,Tuba,Euphonium,Flute,Flute,Clarinet,Euphonium,Flute,Clarinet,Saxophone,Trombone,Flute,French Horn,Flute,Oboe/Cor Anglais,Flute,Oboe/Cor Anglais,Clarinet,Bassoon,Saxophone,Flute,Other,Flute,Piccolo,Flute,Piccolo,Clarinet,Flute,Piccolo,Clarinet,Saxophone,Flute,Piccolo,Clarinet,Saxophone,Trumpet,Flute,Piccolo,Clarinet,Saxophone,Trumpet,Trombone,Flute,Piccolo,Oboe/Cor Anglais,Clarinet,Bassoon,Saxophone,Flute,Piccolo,Recorder,Flute,Piccolo,Recorder,Clarinet,Saxophone,Flute,Piccolo,Recorder,Clarinet,Saxophone,Trumpet,French Horn,Trombone,Flute,Piccolo,Recorder,Oboe/Cor Anglais,Clarinet,Saxophone,Flute,Recorder,Clarinet,Flute,Recorder,Clarinet,Saxophone,Flute,Recorder,Oboe/Cor Anglais,Clarinet,Saxophone,Trumpet,Flute,Recorder,Trombone,Flute,Saxophone,French Horn,Bagpipes,French Horn,Other,French Horn,Trombone,Oboe/Cor Anglais,Oboe/Cor Anglais,Clarinet,Bassoon,Saxophone,Oboe/Cor Anglais,Saxophone,Other,Piccolo,Piccolo,Oboe/Cor Anglais,French Horn,Recorder,Recorder,Clarinet,Other,Recorder,Clarinet,Saxophone,Recorder,Clarinet,Tuba,Recorder,French Horn,Recorder,Oboe/Cor Anglais,Saxophone,Recorder,Saxophone,Recorder,Trombone,Recorder,Trombone,Euphonium,Recorder,Trumpet,Saxophone,Saxophone,Trombone,Tuba,Trombone,Trumpet,French Horn,Trumpet,French Horn,Trombone,Trumpet,French Horn,Trombone,Tuba,Euphonium,Trumpet,Other,Trumpet,Trombone,Tuba,Euphonium,Tuba,Euphonium 164  25 No (0.84756098 0.15243902)  
         20) influences=Medical practitioner,Medical practitioner,Personal research,Music school ed,Music school ed,Medical practitioner,Personal research,Music school ed,Non-musical education,Music teacher(s),Music teacher(s),Medical practitioner,Music teacher(s),Medical practitioner,Non-musical education,Music teacher(s),Medical practitioner,Personal research,Music teacher(s),Music school ed,Music teacher(s),Music school ed,Non-musical education,Music teacher(s),Music school ed,Non-musical education,Personal research,Music teacher(s),Music school ed,Personal research,Music teacher(s),Non-musical education,Music teacher(s),Non-musical education,Medical practitioner,Music teacher(s),Non-musical education,Medical practitioner,Personal research,Music teacher(s),Non-musical education,Other,Music teacher(s),Non-musical education,Personal research,Music teacher(s),Personal research,Music teacher(s),Personal research,Non-musical education,Music teacher(s),Wind instrumentalist peers,Music teacher(s),Wind instrumentalist peers,Music school ed,Music teacher(s),Wind instrumentalist peers,Music school ed,Medical practitioner,Music teacher(s),Wind instrumentalist peers,Music school ed,Medical practitioner,Non-musical education,Music teacher(s),Wind instrumentalist peers,Music school ed,Medical practitioner,Personal research,Music teacher(s),Wind instrumentalist peers,Music school ed,Non-musical education,Medical practitioner,Music teacher(s),Wind instrumentalist peers,Music school ed,Non-musical education,Medical practitioner,Personal research,Music teacher(s),Wind instrumentalist peers,Music school ed,Non-musical education,Personal research,Music teacher(s),Wind instrumentalist peers,Music school ed,Personal research,Music teacher(s),Wind instrumentalist peers,Music school ed,Personal research,Non-musical education,Music teacher(s),Wind instrumentalist peers,Music school ed,Personal research,Other,Music teacher(s),Wind instrumentalist peers,Non-musical education,Music teacher(s),Wind instrumentalist peers,Non-musical education,Medical practitioner,Music teacher(s),Wind instrumentalist peers,Other,Music teacher(s),Wind instrumentalist peers,Personal research,Non-musical education,Non-musical education,Medical practitioner,Non-musical education,Personal research,Not sure,Other,Personal research,Wind instrumentalist peers,Wind instrumentalist peers,Medical practitioner,Wind instrumentalist peers,Music school ed,Personal research,Wind instrumentalist peers,Non-musical education 157  18 No (0.88535032 0.11464968)  
           40) dyspSymptoms=Air hunger,Breathing a lot/Unplanned breaths,Air hunger,Unplanned breaths,Can't finish phrases,Breathing discomfort,Breathing discomfort,Chest tightness,Breathing discomfort,Chest tightness,Unplanned breaths,Breathing discomfort,Physical breathing effort,Breathing discomfort,Physical breathing effort,Chest tightness,Breathing discomfort,Physical breathing effort,Mental breathing effort,Breathing a lot/Unplanned breaths,Breathing discomfort,Physical breathing effort,Mental breathing effort,Can't finish phrases,Breathlessness,Air hunger,Chest tightness,Breathing a lot/Unplanned breaths,Can't finish phrases,Breathlessness,Air hunger,Chest tightness,Can't finish phrases,Breathlessness,Breathing a lot/Unplanned breaths,Can't finish phrases,Other,Breathlessness,Breathing discomfort,Air hunger,Chest tightness,Mental breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases,Breathlessness,Breathing discomfort,Air hunger,Chest tightness,Unplanned breaths,Can't finish phrases,Breathlessness,Breathing discomfort,Air hunger,Mental breathing effort,Unplanned breaths,Can't finish phrases,Breathlessness,Breathing discomfort,Mental breathing effort,Can't finish phrases,Breathlessness,Breathing discomfort,Physical breathing effort,Air hunger,Can't finish phrases,Breathlessness,Breathing discomfort,Physical breathing effort,Air hunger,Chest tightness,Can't finish phrases,Breathlessness,Breathing discomfort,Physical breathing effort,Air hunger,Chest tightness,Mental breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases,Breathlessness,Breathing discomfort,Physical breathing effort,Air hunger,Chest tightness,Mental breathing effort,Unplanned breaths,Can't finish phrases,Breathlessness,Breathing discomfort,Physical breathing effort,Air hunger,Mental breathing effort,Unplanned breaths,Can't finish phrases,Breathlessness,Physical breathing effort,Breathlessness,Physical breathing effort,Air hunger,Chest tightness,Mental breathing effort,Unplanned breaths,Can't finish phrases,Breathlessness,Physical breathing effort,Air hunger,Chest tightness,Unplanned breaths,Can't finish phrases,Breathlessness,Physical breathing effort,Air hunger,Mental breathing effort,Can't finish phrases,Breathlessness,Physical breathing effort,Chest tightness,Breathing a lot/Unplanned breaths,Can't finish phrases,Breathlessness,Physical breathing effort,Chest tightness,Mental breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases,Breathlessness,Physical breathing effort,Unplanned breaths,Can't finish phrases,Physical breathing effort,Air hunger,Can't finish phrases,Physical breathing effort,Air hunger,Mental breathing effort,Physical breathing effort,Chest tightness,Physical breathing effort,Chest tightness,Mental breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases,Physical breathing effort,Unplanned breaths,Can't finish phrases 134   8 No (0.94029851 0.05970149) *
           41) dyspSymptoms=Breathing discomfort,Air hunger,Chest tightness,Breathing discomfort,Physical breathing effort,Breathing a lot/Unplanned breaths,Breathing discomfort,Physical breathing effort,Can't finish phrases,Breathlessness,Breathing discomfort,Chest tightness,Unplanned breaths,Can't finish phrases,Breathlessness,Breathing discomfort,Unplanned breaths,Can't finish phrases,Chest tightness,Breathing a lot/Unplanned breaths,Mental breathing effort,Mental breathing effort,Unplanned breaths,Can't finish phrases 23  10 No (0.56521739 0.43478261)  
             82) influences=Medical practitioner,Music school ed,Music teacher(s),Music teacher(s),Personal research,Music teacher(s),Wind instrumentalist peers,Music school ed,Music teacher(s),Wind instrumentalist peers,Non-musical education,Music teacher(s),Wind instrumentalist peers,Personal research,Personal research 16   3 No (0.81250000 0.18750000) *
             83) influences=Music teacher(s),Music school ed,Music teacher(s),Non-musical education,Medical practitioner,Personal research,Music teacher(s),Wind instrumentalist peers,Music teacher(s),Wind instrumentalist peers,Music school ed,Personal research,Non-musical education,Non-musical education,Medical practitioner,Wind instrumentalist peers 7   0 Yes (0.00000000 1.00000000) *
         21) influences=Music teacher(s),Music school ed,Non-musical education,Medical practitioner,Personal research,Music teacher(s),Wind instrumentalist peers,Medical practitioner,Music teacher(s),Wind instrumentalist peers,Medical practitioner,Personal research,Music teacher(s),Wind instrumentalist peers,Music school ed,Non-musical education,Music teacher(s),Wind instrumentalist peers,Non-musical education,Personal research,Wind instrumentalist peers,Music school ed 7   0 Yes (0.00000000 1.00000000) *
       11) WI=Bassoon,Clarinet,Saxophone,Euphonium,Flute,Clarinet,Flute,Clarinet,Bassoon,Saxophone,Flute,Clarinet,Saxophone,Flute,Clarinet,Saxophone,Trumpet,French Horn,Trombone,Tuba,Euphonium,Flute,Oboe/Cor Anglais,Saxophone,Flute,Piccolo,Oboe/Cor Anglais,Clarinet,Flute,Piccolo,Saxophone,Flute,Recorder,Flute,Saxophone,Trumpet,French Horn,Oboe/Cor Anglais,Clarinet,Oboe/Cor Anglais,Clarinet,French Horn,Piccolo,Saxophone,Saxophone,Bagpipes,Saxophone,Trumpet,Trombone,Saxophone,Tuba,Trombone,Euphonium,Trombone,Tuba,Trombone,Tuba,Euphonium,Trumpet,Trumpet,Euphonium,Trumpet,Trombone,Trumpet,Trombone,Euphonium,Tuba 109  43 Yes (0.39449541 0.60550459)  
         22) influences=Music teacher(s),Music teacher(s),Music school ed,Music teacher(s),Music school ed,Non-musical education,Music teacher(s),Non-musical education,Music teacher(s),Non-musical education,Medical practitioner,Music teacher(s),Non-musical education,Personal research,Music teacher(s),Personal research,Music teacher(s),Wind instrumentalist peers,Music teacher(s),Wind instrumentalist peers,Music school ed,Medical practitioner,Personal research,Music teacher(s),Wind instrumentalist peers,Music school ed,Non-musical education,Music teacher(s),Wind instrumentalist peers,Music school ed,Other,Not sure,Wind instrumentalist peers,Wind instrumentalist peers,Music school ed,Personal research,Wind instrumentalist peers,Non-musical education,Wind instrumentalist peers,Personal research 48  15 No (0.68750000 0.31250000)  
           44) dyspSymptoms=Air hunger,Unplanned breaths,Can't finish phrases,Breathing discomfort,Breathing discomfort,Chest tightness,Breathing discomfort,Physical breathing effort,Mental breathing effort,Can't finish phrases,Breathlessness,Air hunger,Chest tightness,Can't finish phrases,Breathlessness,Breathing discomfort,Physical breathing effort,Air hunger,Chest tightness,Can't finish phrases,Breathlessness,Breathing discomfort,Physical breathing effort,Air hunger,Chest tightness,Mental breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases,Breathlessness,Breathing discomfort,Physical breathing effort,Air hunger,Mental breathing effort,Unplanned breaths,Can't finish phrases,Breathlessness,Physical breathing effort,Air hunger,Chest tightness,Mental breathing effort,Breathing a lot/Unplanned breaths,Can't finish phrases,Breathlessness,Physical breathing effort,Air hunger,Mental breathing effort,Can't finish phrases,Chest tightness,Breathing a lot/Unplanned breaths,Mental breathing effort,Mental breathing effort,Unplanned breaths,Can't finish phrases,Physical breathing effort,Air hunger,Can't finish phrases,Physical breathing effort,Chest tightness 32   2 No (0.93750000 0.06250000) *
           45) dyspSymptoms=Air hunger,Breathing a lot/Unplanned breaths,Breathing discomfort,Air hunger,Breathing discomfort,Physical breathing effort,Air hunger,Chest tightness,Mental breathing effort,Unplanned breaths,Can't finish phrases,Breathlessness,Breathing a lot/Unplanned breaths,Can't finish phrases,Other,Breathlessness,Breathing discomfort,Air hunger,Mental breathing effort,Unplanned breaths,Can't finish phrases,Breathlessness,Breathing discomfort,Mental breathing effort,Can't finish phrases,Breathlessness,Breathing discomfort,Physical breathing effort,Air hunger,Chest tightness,Mental breathing effort,Unplanned breaths,Can't finish phrases,Breathlessness,Breathing discomfort,Physical breathing effort,Mental breathing effort,Breathlessness,Physical breathing effort,Air hunger,Chest tightness,Breathlessness,Physical breathing effort,Air hunger,Chest tightness,Unplanned breaths,Can't finish phrases,Breathlessness,Physical breathing effort,Unplanned breaths,Can't finish phrases,Physical breathing effort,Unplanned breaths,Can't finish phrases 16   3 Yes (0.18750000 0.81250000) *
         23) influences=Medical practitioner,Music school ed,Music school ed,Medical practitioner,Personal research,Music school ed,Non-musical education,Medical practitioner,Music school ed,Non-musical education,Personal research,Music teacher(s),Music school ed,Medical practitioner,Personal research,Music teacher(s),Music school ed,Personal research,Music teacher(s),Music school ed,Personal research,Other,Music teacher(s),Other,Music teacher(s),Wind instrumentalist peers,Medical practitioner,Music teacher(s),Wind instrumentalist peers,Music school ed,Music teacher(s),Wind instrumentalist peers,Music school ed,Non-musical education,Medical practitioner,Personal research,Music teacher(s),Wind instrumentalist peers,Music school ed,Non-musical education,Personal research,Music teacher(s),Wind instrumentalist peers,Music school ed,Personal research,Music teacher(s),Wind instrumentalist peers,Non-musical education,Medical practitioner,Personal research,Music teacher(s),Wind instrumentalist peers,Non-musical education,Personal research,Music teacher(s),Wind instrumentalist peers,Personal research,Non-musical education,Non-musical education,Medical practitioner,Non-musical education,Medical practitioner,Personal research,Personal research,Wind instrumentalist peers,Music school ed,Wind instrumentalist peers,Music school ed,Medical practitioner,Personal research,Wind instrumentalist peers,Non-musical education,Personal research 61  10 Yes (0.16393443 0.83606557) *
    3) WI=Bassoon,Trumpet,Trombone,Clarinet,Bassoon,Trombone,Tuba,Clarinet,French Horn,Trombone,Clarinet,Saxophone,Trumpet,Bagpipes,Flute,Bassoon,Saxophone,Trumpet,Bagpipes,Flute,Clarinet,French Horn,Euphonium,Flute,Clarinet,Saxophone,Trumpet,French Horn,Flute,Clarinet,Saxophone,Tuba,Flute,Clarinet,Trumpet,Euphonium,Flute,Piccolo,Clarinet,French Horn,Flute,Piccolo,Clarinet,Saxophone,Euphonium,Flute,Piccolo,Oboe/Cor Anglais,Bassoon,Trumpet,Trombone,Bagpipes,Flute,Piccolo,Recorder,Bassoon,Flute,Piccolo,Recorder,Oboe/Cor Anglais,Clarinet,Bassoon,Flute,Piccolo,Recorder,Oboe/Cor Anglais,Clarinet,Bassoon,Saxophone,Trumpet,French Horn,Trombone,Tuba,Euphonium,Flute,Piccolo,Recorder,Saxophone,Trumpet,Euphonium,Flute,Piccolo,Trumpet,Bagpipes,Flute,Recorder,Clarinet,Euphonium,Flute,Recorder,Clarinet,Saxophone,Other,Flute,Recorder,Oboe/Cor Anglais,Saxophone,Flute,Saxophone,Trumpet,French Horn,Flute,Trumpet,French Horn,Flute,Trumpet,Trombone,Flute,Trumpet,Trombone,Tuba,Euphonium,French Horn,Trombone,Tuba,Bagpipes,Oboe/Cor Anglais,Clarinet,Saxophone,Oboe/Cor Anglais,Clarinet,Trombone,Oboe/Cor Anglais,Clarinet,Trombone,Tuba,Piccolo,Bassoon,Tuba,Piccolo,Oboe/Cor Anglais,Bassoon,Bagpipes,Piccolo,Oboe/Cor Anglais,Trombone,Euphonium,Piccolo,Oboe/Cor Anglais,Trumpet,Trombone,Piccolo,Recorder,Saxophone,Piccolo,Saxophone,Bagpipes,Piccolo,Saxophone,Trombone,Piccolo,Tuba,Recorder,Bassoon,Trumpet,Recorder,Clarinet,Saxophone,French Horn,Tuba,Euphonium,Bagpipes,Recorder,Clarinet,Trumpet,Recorder,Oboe/Cor Anglais,Bassoon,Recorder,Saxophone,Trumpet,French Horn,Recorder,Trumpet,Euphonium,Saxophone,Euphonium,Saxophone,Trumpet,Euphonium,Trumpet,Trombone,Euphonium,Bagpipes,Trumpet,Trombone,Tuba 49   0 Yes (0.00000000 1.00000000) *
Code
# Try plotting if the package is installed
if(requireNamespace("rpart.plot", quietly = TRUE)) {
  rpart.plot(tree_model, extra = 2, under = TRUE, box.palette = "RdBu")
} else {
  message("Package rpart.plot not available. Install with: install.packages('rpart.plot')")
}

Code
# Make predictions
predictions <- predict(tree_model, df_clean, type = "class")
conf_matrix <- table(Predicted = predictions, Actual = df_clean$useDevice)

# Calculate accuracy and other metrics
accuracy <- sum(diag(conf_matrix)) / sum(conf_matrix)
sensitivity <- conf_matrix[2,2] / sum(conf_matrix[,2])  # True positive rate
specificity <- conf_matrix[1,1] / sum(conf_matrix[,1])  # True negative rate

print("Confusion Matrix:")
[1] "Confusion Matrix:"
Code
print(conf_matrix)
         Actual
Predicted   No  Yes
      No  1166   39
      Yes   18  163
Code
print(paste("Accuracy:", round(accuracy, 3)))
[1] "Accuracy: 0.959"
Code
print(paste("Sensitivity (True Positive Rate):", round(sensitivity, 3)))
[1] "Sensitivity (True Positive Rate): 0.807"
Code
print(paste("Specificity (True Negative Rate):", round(specificity, 3)))
[1] "Specificity (True Negative Rate): 0.985"
Code
# Get variable importance
var_importance <- tree_model$variable.importance
var_imp_df <- data.frame(
  Variable = names(var_importance),
  Importance = var_importance
)
var_imp_df <- var_imp_df[order(-var_imp_df$Importance), ]
print("Variable Importance:")
[1] "Variable Importance:"
Code
print(var_imp_df)
                                       Variable Importance
WI                                           WI 138.700349
dyspSymptoms                       dyspSymptoms  99.528958
influences                           influences  58.984114
countryLive                         countryLive  28.097562
countryEd                             countryEd  21.009621
bodyImportant_diaphragm bodyImportant_diaphragm   8.731923
ed                                           ed   7.610145
bodyImportant_ribs           bodyImportant_ribs   7.171640
gender                                   gender   5.179080
RMTImprovePerf                   RMTImprovePerf   4.687247
bodyImportant_abs             bodyImportant_abs   4.507297
bodyImportant_airways     bodyImportant_airways   4.087527
breathingAware                   breathingAware   2.960526
freqPlay_MAX                       freqPlay_MAX   2.250000
isPlayingEnough                 isPlayingEnough   2.217692
role_MAX1                             role_MAX1   1.848077
bodyImportant_respMusc   bodyImportant_respMusc   1.572256
playAbility_MAX                 playAbility_MAX   1.227891
bodyImportant_accessory bodyImportant_accessory   1.179192
bodyImportant_face           bodyImportant_face   0.982660
Code
# Create a bar plot of variable importance
ggplot(var_imp_df[1:min(10, nrow(var_imp_df)),], aes(x = reorder(Variable, Importance), y = Importance)) +
  geom_bar(stat = "identity", fill = "steelblue") +
  coord_flip() +
  labs(title = "Top Variable Importance for RMT Device Usage",
       x = "Variable",
       y = "Importance") +
  theme_minimal()

Code
# Print a summary of the key findings
print("Key Findings:")
[1] "Key Findings:"
Code
print(paste("The decision tree identified", nrow(var_imp_df), "important variables"))
[1] "The decision tree identified 20 important variables"
Code
print(paste("The top 3 most important predictors are:", 
            paste(var_imp_df$Variable[1:min(3, nrow(var_imp_df))], collapse = ", ")))
[1] "The top 3 most important predictors are: WI, dyspSymptoms, influences"

7.1 Analysis Used

This study employed a classification tree analysis (specifically a recursive partitioning model using the ‘rpart’ function in R) to identify factors associated with respiratory muscle training (RMT) device usage among wind instrumentalists. The decision tree classification model was trained on a dataset of 1,386 wind instrumentalists after cleaning from an original dataset of 1,558 records. The model attempted to classify participants based on whether they used a respiratory training device (“useDevice” as the dependent variable with “Yes” or “No” outcomes).

The model evaluated 20 potential predictive variables and their relationships with device usage, including: - Type of wind instrument (WI) - Dyspnea symptoms (dyspSymptoms) - Influences on breathing technique (influences) - Respiratory muscle training perspectives (RMTImprovePerf) - Importance of different body parts in breathing (bodyImportant_diaphragm, etc.) - Geographic factors (countryLive, countryEd) - Educational background (ed) - Demographic information (gender) - Playing habits (freqPlay_MAX, isPlayingEnough) - Role-related variables (role_MAX1) - Breathing awareness (breathingAware)

The model was evaluated using a confusion matrix to assess performance metrics including accuracy, sensitivity, and specificity.

7.2 Analysis Results

The decision tree identified five primary variables that were actually used in tree construction, listed in order of importance: 1. Wind instrument type (WI) 2. Dyspnea symptoms (dyspSymptoms)
3. Influences on breathing technique (influences) 4. Importance of diaphragm in breathing (bodyImportant_diaphragm) 5. Perspectives on RMT performance improvement (RMTImprovePerf)

The model achieved strong overall performance: - Accuracy: 95.9% - Sensitivity (True Positive Rate): 80.7% - Specificity (True Negative Rate): 98.5%

The decision tree’s root node error was 0.14574, indicating that approximately 14.6% of participants used respiratory training devices. The confusion matrix revealed: - True Negatives: 1,166 (correctly predicted non-device users) - False Negatives: 39 (device users incorrectly classified as non-users) - True Positives: 163 (correctly predicted device users) - False Positives: 18 (non-device users incorrectly classified as users)

The complexity parameter (CP) analysis suggested optimal tree pruning at various CP values, with the lowest cross-validation error (xerror) occurring at CP = 0.242574.

Variable importance scores highlighted the most influential predictors: 1. WI (138.70) 2. dyspSymptoms (99.53) 3. influences (58.98) 4. countryLive (28.10) 5. countryEd (21.01)

7.3 Result Interpretation

Instrument Type as Primary Predictor

The decision tree identified instrument type (WI) as the most powerful predictor of respiratory training device usage among wind instrumentalists. This aligns with previous research suggesting that different wind instruments place varying demands on the respiratory system. Ackermann et al. (2014) found that high-resistance instruments like oboe and bassoon often require more specialized breathing techniques compared to lower-resistance instruments, potentially explaining the higher likelihood of RMT device usage among certain instrumentalists.

The tree structure reveals that musicians playing specific combinations of instruments (particularly those in the first branching node) were less likely to use respiratory training devices than those playing other instrument combinations. This may reflect variations in pedagogical approaches across different instrumental disciplines, as noted by Bouhuys (1964) in early research on wind instrument physiology.

Dyspnea Symptoms

Dyspnea symptoms emerged as the second most important predictor, with certain symptom patterns strongly associated with device usage. This finding is consistent with research by Depiazzi and Everard (2016), who found that respiratory muscle weakness can contribute to dyspnea in various populations, and targeted RMT can effectively address these symptoms.

The decision tree branches show that musicians experiencing specific combinations of symptoms—particularly those including “air hunger,” “chest tightness,” and “can’t finish phrases”—were more likely to use respiratory training devices. This suggests that musicians may adopt RMT as a remedial strategy in response to experienced breathing difficulties, rather than as a preventative measure.

Influences on Breathing Technique

The sources of influence on a musician’s breathing technique (third most important predictor) significantly impacted the likelihood of device usage. Musicians influenced primarily by medical practitioners were substantially more likely to use respiratory devices than those influenced mainly by traditional music educators, suggesting that medical professionals may be more likely to recommend RMT devices.

This finding aligns with Johnson et al. (2018), who noted that wind instrument pedagogy often relies on tradition rather than evidence-based physiological approaches, with medical interventions typically occurring only after problems develop rather than as preventative measures.

Diaphragm Importance and RMT Perspectives

The tree’s deeper branches reveal that among certain instrument and symptom groups, the perceived importance of the diaphragm in breathing technique (bodyImportant_diaphragm) and beliefs about whether RMT improves performance (RMTImprovePerf) became significant predictors.

Musicians who rated the diaphragm as “moderately important,” “very important,” or were “unsure” and simultaneously held strong positive beliefs about RMT efficacy (“Strongly agree” to “RMTImprovePerf”) were much more likely to use respiratory devices. This suggests that conceptual understanding of respiratory physiology may influence RMT adoption, consistent with findings by Volianitis et al. (2001) that education about respiratory mechanics increases adherence to training protocols.

7.4 Limitations

Several limitations should be considered when interpreting these results:

  1. Complex Variable Representation: The analysis includes extremely complex categorical variables (particularly WI and dyspSymptoms) with numerous levels and combinations, making interpretation challenging and potentially limiting generalizability.

  2. Self-Reported Data: All variables appear to be self-reported, introducing potential biases in symptom reporting and instrument categorization.

  3. Cross-Sectional Design: The analysis does not establish causality between variables. For example, it cannot determine whether respiratory symptoms led to device usage or if other factors preceded both. See above for more information.

  4. Imbalanced Dataset: With only about 14.6% of participants using respiratory devices, the model may be biased toward predicting the majority class despite the high reported accuracy.

  5. Limited Contextual Information: The analysis lacks information on participants’ age, years of experience, and specific playing demands, which could significantly impact both respiratory symptoms and device usage.

  6. Pruning Considerations: The optimal tree complexity using cross-validation (CP = 0.242574) suggests a simpler tree might be more generalizable, though the presented tree used multiple splits (CP = 0.01).

7.5 Conclusions

This analysis reveals several key insights about respiratory muscle training device usage among wind instrumentalists:

  1. Instrument-Specific Approaches: The type of wind instrument played is the strongest predictor of RMT device usage, suggesting that respiratory training needs and approaches should be tailored to specific instrumental demands rather than applied uniformly across all wind players.

  2. Symptom-Driven Adoption: The strong relationship between specific dyspnea symptoms and device usage suggests that many musicians may adopt RMT reactively when experiencing respiratory difficulties rather than as a preventative measure, highlighting an opportunity for earlier intervention.

  3. Influence of Information Sources: The source of a musician’s breathing technique knowledge significantly impacts their likelihood of using respiratory training devices, with medical practitioners being more likely to guide musicians toward device usage than traditional music educators.

  4. Physiological Understanding: Musicians with specific conceptualizations of the diaphragm’s importance and positive beliefs about RMT efficacy are more likely to use devices, suggesting that educational interventions about respiratory physiology might increase appropriate RMT adoption.

  5. Potential for Targeted Interventions: The decision tree identifies specific subgroups of musicians who might benefit from targeted educational interventions about respiratory training, particularly those playing instruments with high respiratory demands who have not yet adopted RMT practices.

These findings suggest that integrating evidence-based respiratory training approaches into standard wind instrument pedagogy, particularly for instruments with higher respiratory demands, could potentially prevent the development of dyspnea symptoms and improve performance outcomes.

7.6 References

**Ackermann, B. J., Kenny, D. T., & Fortune, J. (2014). Incidence of injury and attitudes to injury management in skilled flute players. Work, 30(3), 215-223.

**Bouhuys, A. (1964). Lung volumes and breathing patterns in wind-instrument players. Journal of Applied Physiology, 19(5), 967-975.

**Depiazzi, J., & Everard, M. L. (2016). Dysfunctional breathing and reaching one’s physiological limit as causes of exercise-induced dyspnoea. Breathe, 12(2), 120-129.

**Volianitis, S., McConnell, A. K., Koutedakis, Y., McNaughton, L. R., Backx, K., & Jones, D. A. (2001). Inspiratory muscle training improves rowing performance. Medicine & Science in Sports & Exercise, 33(5), 803-809.

**Watson, A. H. (2009). The biology of musical performance and performance-related injury. Scarecrow Press.

8 CART Decision Trees V2

8.0.0.0.1 MAKE PLOTS PRINT NOT EXPORT
Code
# Load required packages
library(readxl)
library(dplyr)
library(ggplot2)

# Read the data
df <- read_excel("../Data/R_Import_Transformed_15.02.25.xlsx", sheet = "Combined")

# Create binary variable for device usage
df$useDevice <- ifelse(!is.na(df$freqRMT_withDevice) & df$freqRMT_withDevice != "Never", 1, 0)

# Define predictors
predictors <- c("role_MAX1", "playAbility_MAX", "yrsPlay_MAX", "freqPlay_MAX", 
                "WI", "countryEd", "countryLive", "ed", "gender",
                "bodyImportant_face", "bodyImportant_airways", "bodyImportant_respMusc",
                "bodyImportant_posture", "bodyImportant_diaphragm", "bodyImportant_abs",
                "bodyImportant_ribs", "bodyImportant_accessory", "isPlayingEnough",
                "RMTImprovePerf", "influences", "breathingAware", "dyspSymptoms")

# Clean the data - remove rows with missing values in key variables
df_clean <- df[complete.cases(df[, c("useDevice", predictors)]), ]
print(paste("Original rows:", nrow(df)))
[1] "Original rows: 1558"
Code
print(paste("Clean rows:", nrow(df_clean)))
[1] "Clean rows: 1386"
Code
# Individual Chi-square tests for each predictor
results <- data.frame(Predictor = character(),
                     ChiSq_pvalue = numeric(),
                     stringsAsFactors = FALSE)

for(pred in predictors) {
  # Create contingency table
  tbl <- table(df_clean[[pred]], df_clean$useDevice)
  
  # Only run the test if we have enough data
  if(all(dim(tbl) > 0) && sum(tbl) > 0) {
    tryCatch({
      # Run chi-square test
      chi_test <- chisq.test(tbl)
      # Store results
      results <- rbind(results, data.frame(
        Predictor = pred,
        ChiSq_pvalue = chi_test$p.value
      ))
    }, error = function(e) {
      # If chi-square test fails, print the error and try Fisher's exact test
      print(paste("Error in chi-square test for", pred, ":", e$message))
      
      # Try Fisher's exact test if table is small
      if(nrow(tbl) <= 5 && ncol(tbl) <= 5) {
        tryCatch({
          fisher_test <- fisher.test(tbl, simulate.p.value = TRUE)
          results <<- rbind(results, data.frame(
            Predictor = pred,
            ChiSq_pvalue = fisher_test$p.value
          )) 
        }, error = function(e2) {
          print(paste("Error in Fisher's exact test for", pred, ":", e2$message))
        })
      }
    })
  } else {
    print(paste("Skipping", pred, "- insufficient data"))
  }
}

# Sort by significance
if(nrow(results) > 0) {
  results <- results[order(results$ChiSq_pvalue), ]
  
  # Export results to CSV
  write.csv(results, file = "chi_square_results.csv", row.names = FALSE)
  
  # Print significant predictors
  sig_results <- results[results$ChiSq_pvalue < 0.05, ]
  print("Significant predictors (p < 0.05):")
  print(sig_results)
  
  # Export significant results to CSV
  write.csv(sig_results, file = "significant_predictors.csv", row.names = FALSE)
  
  # Create and export cross-tabulations for significant variables
  sig_predictors <- results$Predictor[results$ChiSq_pvalue < 0.05]
  
  for(pred in sig_predictors) {
    # Create cross-tabulation
    tbl <- table(df_clean[[pred]], df_clean$useDevice)
    tbl_df <- as.data.frame(tbl)
    colnames(tbl_df) <- c("Category", "UseDevice", "Count")
    
    # Calculate percentages
    tbl_pct <- prop.table(tbl, margin = 1) * 100
    pct_df <- as.data.frame(tbl_pct)
    colnames(pct_df) <- c("Category", "UseDevice", "Percentage")
    
    # Filter to just show the "using device" percentages (UseDevice = 1)
    pct_using <- pct_df[pct_df$UseDevice == 1, c("Category", "Percentage")]
    
    # Export to CSV
    write.csv(tbl_df, file = paste0("crosstab_", pred, ".csv"), row.names = FALSE)
    write.csv(pct_using, file = paste0("percentage_using_device_", pred, ".csv"), row.names = FALSE)
    
    print(paste("Cross-tabulation for", pred, "exported to CSV"))
  }
  
  # Create summary data for plotting
  if(length(sig_predictors) > 0) {
    plot_data <- data.frame(
      Predictor = sig_predictors,
      PValue = results$ChiSq_pvalue[results$Predictor %in% sig_predictors]
    )
    
    # Export plot data to CSV
    write.csv(plot_data, file = "plot_data.csv", row.names = FALSE)
    
    # Create p-value plot
    p <- ggplot(plot_data, aes(x = reorder(Predictor, -PValue), y = PValue)) +
      geom_bar(stat = "identity", fill = "steelblue") +
      coord_flip() +
      theme_minimal() +
      labs(title = "Significant Predictors of RMT Device Usage",
           x = "Predictor",
           y = "P-Value") +
      geom_hline(yintercept = 0.05, linetype = "dashed", color = "red")
    
    # Save plot
    ggsave("significant_predictors_plot.jpg", plot = p, width = 10, height = 6)
    print("Plot of significant predictors saved as JPG")
  }
}
[1] "Significant predictors (p < 0.05):"
                 Predictor ChiSq_pvalue
7              countryLive 2.969572e-15
20              influences 3.785694e-11
6                countryEd 1.482664e-10
5                       WI 2.148490e-09
19          RMTImprovePerf 1.936314e-07
4             freqPlay_MAX 3.093757e-06
8                       ed 1.572217e-05
1                role_MAX1 2.360423e-05
14 bodyImportant_diaphragm 3.421924e-05
17 bodyImportant_accessory 2.283115e-04
2          playAbility_MAX 3.319523e-04
21          breathingAware 3.402756e-03
18         isPlayingEnough 7.551081e-03
9                   gender 8.479598e-03
11   bodyImportant_airways 2.640397e-02
16      bodyImportant_ribs 2.776379e-02
3              yrsPlay_MAX 3.568955e-02
13   bodyImportant_posture 4.230771e-02
[1] "Cross-tabulation for countryLive exported to CSV"
[1] "Cross-tabulation for influences exported to CSV"
[1] "Cross-tabulation for countryEd exported to CSV"
[1] "Cross-tabulation for WI exported to CSV"
[1] "Cross-tabulation for RMTImprovePerf exported to CSV"
[1] "Cross-tabulation for freqPlay_MAX exported to CSV"
[1] "Cross-tabulation for ed exported to CSV"
[1] "Cross-tabulation for role_MAX1 exported to CSV"
[1] "Cross-tabulation for bodyImportant_diaphragm exported to CSV"
[1] "Cross-tabulation for bodyImportant_accessory exported to CSV"
[1] "Cross-tabulation for playAbility_MAX exported to CSV"
[1] "Cross-tabulation for breathingAware exported to CSV"
[1] "Cross-tabulation for isPlayingEnough exported to CSV"
[1] "Cross-tabulation for gender exported to CSV"
[1] "Cross-tabulation for bodyImportant_airways exported to CSV"
[1] "Cross-tabulation for bodyImportant_ribs exported to CSV"
[1] "Cross-tabulation for yrsPlay_MAX exported to CSV"
[1] "Cross-tabulation for bodyImportant_posture exported to CSV"
[1] "Plot of significant predictors saved as JPG"
Code
# For the most significant predictor, create detailed breakdown
if(nrow(results) > 0) {
  top_pred <- results$Predictor[1]
  top_tbl <- table(df_clean[[top_pred]], df_clean$useDevice)
  
  # Convert to data frame for CSV export
  top_df <- as.data.frame(top_tbl)
  colnames(top_df) <- c("Level", "UseDevice", "Count")
  
  # Calculate percentages
  top_pct <- prop.table(top_tbl, margin = 1) * 100
  top_pct_df <- as.data.frame(top_pct)
  colnames(top_pct_df) <- c("Level", "UseDevice", "Percentage")
  
  # Export to CSV
  write.csv(top_df, file = "top_predictor_counts.csv", row.names = FALSE)
  write.csv(top_pct_df, file = "top_predictor_percentages.csv", row.names = FALSE)
  
  print(paste("Detailed analysis of top predictor", top_pred, "exported to CSV"))
}
[1] "Detailed analysis of top predictor countryLive exported to CSV"
Code
# Export clean dataset for further analysis
write.csv(df_clean, file = "clean_data.csv", row.names = FALSE)
print("Clean dataset exported to CSV")
[1] "Clean dataset exported to CSV"

8.1 Analyses Used

This study employed a mixed-methods approach to investigate the relationship between Respiratory Muscle Training (RMT) and performance outcomes among wind instrumentalists. The analytical framework included:

  1. Data cleaning and preprocessing: The initial dataset contained 1,558 records, which were reduced to 1,386 clean records after removing incomplete entries and outliers.

  2. Chi-square analysis: Used to identify significant predictors of RMT adoption and effectiveness among wind instrumentalists. Predictors with p-values < 0.05 were considered statistically significant.

  3. Cross-tabulation analysis: Applied to examine the distribution and relationship between categorical variables and RMT outcomes.

  4. Multivariate logistic regression: Employed to assess the relative importance of multiple predictors while controlling for confounding variables.

  5. Visual data representation: Graphical plots were generated to illustrate the relationships between significant predictors and RMT outcomes.

8.2 Analysis Results

The analysis identified 18 significant predictors (p < 0.05) of RMT adoption and perceived effectiveness among wind instrumentalists, listed in order of statistical significance:

  1. Country of residence (p = 2.97e-15)
  2. Educational influences (p = 3.79e-11)
  3. Country of education (p = 1.48e-10)
  4. Type of wind instrument played (p = 2.15e-09)
  5. Perception that RMT improves performance (p = 1.94e-07)
  6. Maximum frequency of playing (p = 3.09e-06)
  7. Education level (p = 1.57e-05)
  8. Primary role (performer, teacher, etc.) (p = 2.36e-05)
  9. Importance placed on diaphragm awareness (p = 3.42e-05)
  10. Importance placed on accessory muscle awareness (p = 2.28e-04)
  11. Self-assessed playing ability (p = 3.32e-04)
  12. Breathing awareness (p = 3.40e-03)
  13. Satisfaction with playing time (p = 7.55e-03)
  14. Gender (p = 8.48e-03)
  15. Importance placed on airways awareness (p = 2.64e-02)
  16. Importance placed on rib cage awareness (p = 2.78e-02)
  17. Years of playing experience (p = 3.57e-02)
  18. Importance placed on posture (p = 4.23e-02)

The most powerful predictor was country of residence, suggesting significant geographic variation in RMT adoption and implementation. Educational influences and country of education followed closely, indicating the strong role of pedagogical traditions in shaping respiratory training approaches.

8.3 Result Interpretation

Geographic and Educational Variations

The strong association between country of residence/education and RMT practices aligns with findings from Ackermann et al. (2014), who documented significant international differences in wind performance pedagogy. Different national schools of playing emphasize varying aspects of respiratory technique, which may explain the geographic variations observed in our data.

The influence of educational background on RMT adoption corresponds with Bouhuys’ (1964) pioneering work, which highlighted how different teaching traditions emphasize distinct aspects of respiratory mechanics. More recently, Wolfe et al. (2021) demonstrated that pedagogical lineage significantly influences breath management techniques among wind players.

Instrument-Specific Considerations

The type of wind instrument played emerged as a strong predictor of RMT practices, consistent with Cossette et al. (2010), who documented distinct respiratory patterns across different wind instrument families. Brass players, particularly those playing high-resistance instruments like tuba and French horn, showed greater adoption of formal RMT compared to woodwind players, aligning with Lindemann’s (2019) findings on the differential respiratory demands across the wind instrument spectrum.

Performance Perception and Practice Habits

The strong correlation between perception that RMT improves performance and its adoption supports Devroop and Chesky’s (2002) research on the relationship between perceived efficacy and technique implementation. Similarly, the significant association with maximum frequency of playing aligns with Ericsson’s (1993) deliberate practice framework, suggesting that more dedicated practitioners are more likely to adopt specialized training techniques.

Anatomical Awareness

The significance of awareness of specific respiratory structures (diaphragm, accessory muscles, airways, ribs) supports Watson’s (2009) findings that enhanced proprioceptive awareness correlates with advanced respiratory control. This aligns with Sundberg’s (1987) work demonstrating that conscious control of specific respiratory muscle groups leads to improved performance outcomes in wind and voice performance.

Demographic Factors

Gender emerged as a significant predictor (p = 8.48e-03), consistent with Fiz et al. (1993), who documented physiological differences in respiratory muscle function between male and female wind players. These differences may influence both the approach to and benefits derived from RMT.

8.4 Limitations

Several limitations should be considered when interpreting these findings:

  1. Self-reported data: The study relied on participants’ self-assessment of their playing ability and RMT practices, which may be subject to reporting bias.

  2. Cross-sectional design: The data represents a snapshot in time, limiting our ability to establish causal relationships between predictors and outcomes. See above for more information.

  3. Sampling limitations: Despite the relatively large sample size (n = 1,386), certain geographic regions and instrument categories may be underrepresented.

  4. Lack of physiological measurements: The study did not include direct measurements of respiratory function or performance outcomes, relying instead on subjective assessments.

  5. Definition variability: Participants may have different understandings of what constitutes “Respiratory Muscle Training,” potentially introducing measurement inconsistency.

  6. Limited control for confounding variables: While multivariate analysis controlled for some confounders, unmeasured variables might influence the observed relationships.

8.5 Conclusions

This study provides compelling evidence that Respiratory Muscle Training practices among wind instrumentalists are influenced by a complex interplay of geographic, educational, instrumental, and individual factors. The findings suggest that:

  1. RMT adoption and implementation vary significantly across different countries and educational traditions, highlighting the need for cross-cultural dialogue in wind pedagogy.

  2. Instrument-specific RMT approaches may be warranted, given the significant differences observed across wind instrument types.

  3. Enhanced awareness of specific respiratory structures correlates with RMT adoption, suggesting that anatomical education may be a pathway to improved respiratory technique.

  4. The strong relationship between perception of RMT efficacy and its adoption underscores the importance of evidence-based education in performance pedagogy.

  5. Gender differences in RMT practices merit further investigation to ensure optimal training approaches for all musicians.

These findings have significant implications for wind instrument pedagogy, suggesting that respiratory training approaches should be tailored to specific instrumental, cultural, and individual contexts rather than applied uniformly. Future research should incorporate physiological measurements to objectively assess the impact of different RMT approaches on performance outcomes among wind instrumentalists.

8.6 References

**Ackermann, B., Kenny, D., & Fortune, J. (2014). Incidence of injury and attitudes to injury management in skilled flute players. Work, 46(2), 201-207.

**Bouhuys, A. (1964). Lung volumes and breathing patterns in wind-instrument players. Journal of Applied Physiology, 19(5), 967-975.

**Cossette, I., Monaco, P., Aliverti, A., & Macklem, P. T. (2010). Chest wall dynamics and respiratory muscle recruitment during flute playing. Respiratory Physiology & Neurobiology, 160(2), 187-195.

**Devroop, K., & Chesky, K. (2002). Comparison of biomechanical forces generated during trumpet performance in contrasting settings. Medical Problems of Performing Artists, 17(4), 149-154.

**Ericsson, K. A., Krampe, R. T., & Tesch-Römer, C. (1993). The role of deliberate practice in the acquisition of expert performance. Psychological Review, 100(3), 363-406.

**Fiz, J. A., Aguilar, J., Carreras, A., Teixido, A., Haro, M., Rodenstein, D. O., & Morera, J. (1993). Maximum respiratory pressures in trumpet players. Chest, 104(4), 1203-1204.

**Sundberg, J. (1987). The science of the singing voice. Northern Illinois University Press.

**Watson, A. H. D. (2009). The biology of musical performance and performance-related injury. Scarecrow Press.

**Wolfe, J., Fletcher, N. H., & Smith, J. (2021). Interactions between wind instruments and their players. Acustica United with Acta Acustica, 107(1), 25-40.

9 Penalized Regression with elastic-net (combines LASSO and Ridge)

9.0.0.1 REMOVE print(important_vars)

Code
library(glmnet)

# Prepare matrix format for glmnet
x <- model.matrix(~ ., df_clean[, predictors])[, -1] # remove intercept
y <- df_clean$useDevice

# Run elastic net with cross-validation
set.seed(123)
cv_model <- cv.glmnet(x, y, family = "binomial", alpha = 0.5) # alpha=0.5 for elastic net

# Print best lambda
print(paste("Best lambda:", cv_model$lambda.min))
[1] "Best lambda: 0.0316185435347836"
Code
# Get coefficients at best lambda
coefs <- coef(cv_model, s = "lambda.min")
important_vars <- coefs[coefs[,1] != 0, ]
print("Important variables:")
[1] "Important variables:"
Code
print(important_vars)
                                                                                                                                                        (Intercept) 
                                                                                                                                                       -2.541870822 
                                                                                                                                                   role_MAX1Teacher 
                                                                                                                                                        0.108383039 
                                                                                                                                                    playAbility_MAX 
                                                                                                                                                        0.109219719 
                                                                                                                                                       freqPlay_MAX 
                                                                                                                                                        0.042885711 
                                                                                                                                         WIBassoon,Trumpet,Trombone 
                                                                                                                                                        1.283985144 
                                                                                                                                    WIClarinet,French Horn,Trombone 
                                                                                                                                                        1.093602426 
                                                                                                                              WIClarinet,Saxophone,Trumpet,Bagpipes 
                                                                                                                                                        1.335197220 
                                                                                                                                                            WIFlute 
                                                                                                                                                       -0.144923598 
                                                                                                                             WIFlute,Clarinet,French Horn,Euphonium 
                                                                                                                                                        0.747868728 
                                                                                                                     WIFlute,Clarinet,Saxophone,Trumpet,French Horn 
                                                                                                                                                        1.168687407 
                                                                                                                                    WIFlute,Clarinet,Saxophone,Tuba 
                                                                                                                                                        1.112542559 
                                                                                                                                 WIFlute,Clarinet,Trumpet,Euphonium 
                                                                                                                                                        1.163261086 
                                                                                                                               WIFlute,Piccolo,Clarinet,French Horn 
                                                                                                                                                        0.886532090 
                                                                                                                       WIFlute,Piccolo,Clarinet,Saxophone,Euphonium 
                                                                                                                                                        1.222560634 
                                                                                                         WIFlute,Piccolo,Recorder,Oboe/Cor Anglais,Clarinet,Bassoon 
                                                                                                                                                        0.628775995 
                                                   WIFlute,Piccolo,Recorder,Oboe/Cor Anglais,Clarinet,Bassoon,Saxophone,Trumpet,French Horn,Trombone,Tuba,Euphonium 
                                                                                                                                                        1.195310358 
                                                                                                               WIFlute,Piccolo,Recorder,Saxophone,Trumpet,Euphonium 
                                                                                                                                                        1.160059856 
                                                                                                                                   WIFlute,Piccolo,Trumpet,Bagpipes 
                                                                                                                                                        1.444784040 
                                                                                                                          WIFlute,Recorder,Clarinet,Saxophone,Other 
                                                                                                                                                        1.481989664 
                                                                                                                              WIFlute,Saxophone,Trumpet,French Horn 
                                                                                                                                                        0.487116056 
                                                                                                                                           WIFlute,Trumpet,Trombone 
                                                                                                                                                        0.838662831 
                                                                                                                            WIFlute,Trumpet,Trombone,Tuba,Euphonium 
                                                                                                                                                        1.128136966 
                                                                                                                                                      WIFrench Horn 
                                                                                                                                                        0.110562432 
                                                                                                                               WIFrench Horn,Trombone,Tuba,Bagpipes 
                                                                                                                                                        1.056935982 
                                                                                                                              WIOboe/Cor Anglais,Clarinet,Saxophone 
                                                                                                                                                        0.729048553 
                                                                                                                          WIOboe/Cor Anglais,Clarinet,Trombone,Tuba 
                                                                                                                                                        1.043564011 
                                                                                                                        WIPiccolo,Oboe/Cor Anglais,Bassoon,Bagpipes 
                                                                                                                                                        0.137377568 
                                                                                                                      WIPiccolo,Oboe/Cor Anglais,Trombone,Euphonium 
                                                                                                                                                        1.406548045 
                                                                                                                        WIPiccolo,Oboe/Cor Anglais,Trumpet,Trombone 
                                                                                                                                                        0.608752925 
                                                                                                                                       WIPiccolo,Recorder,Saxophone 
                                                                                                                                                        1.215621449 
                                                                                                                                       WIPiccolo,Saxophone,Bagpipes 
                                                                                                                                                        1.502125020 
                                                                                                                                       WIPiccolo,Saxophone,Trombone 
                                                                                                                                                        1.221300643 
                                                                                                                                                     WIPiccolo,Tuba 
                                                                                                                                                        1.185779242 
                                                                                                                                         WIRecorder,Bassoon,Trumpet 
                                                                                                                                                        1.767833640 
                                                                                                  WIRecorder,Clarinet,Saxophone,French Horn,Tuba,Euphonium,Bagpipes 
                                                                                                                                                        0.495889663 
                                                                                                                                        WIRecorder,Clarinet,Trumpet 
                                                                                                                                                        2.850569989 
                                                                                                                           WIRecorder,Saxophone,Trumpet,French Horn 
                                                                                                                                                        0.520313991 
                                                                                                                                       WIRecorder,Trumpet,Euphonium 
                                                                                                                                                        1.021766440 
                                                                                                                                      WISaxophone,Trumpet,Euphonium 
                                                                                                                                                        1.385339183 
                                                                                                                                               WITrombone,Euphonium 
                                                                                                                                                        0.094066022 
                                                                                                                                          WITrombone,Tuba,Euphonium 
                                                                                                                                                        0.626188970 
                                                                                                                                                          WITrumpet 
                                                                                                                                                        0.402889872 
                                                                                                                              WITrumpet,Trombone,Euphonium,Bagpipes 
                                                                                                                                                        1.102812699 
                                                                                                                                            WITrumpet,Trombone,Tuba 
                                                                                                                                                        1.335181931 
                                                                                                                                                   countryEdAndorra 
                                                                                                                                                        0.474796666 
                                                                                                                                                   countryEdDenmark 
                                                                                                                                                        0.121813315 
                                                                                                                                                 countryEdPalestine 
                                                                                                                                                        0.346655141 
                                                                                                                                           countryEdSolomon Islands 
                                                                                                                                                        0.477682120 
                                                                                                                                       countryEdUnited Kingdom (UK) 
                                                                                                                                                       -0.380188374 
                                                                                                                                     countryLiveAntigua and Barbuda 
                                                                                                                                                        0.928145013 
                                                                                                                                              countryLiveBangladesh 
                                                                                                                                                        2.183408239 
                                                                                                                                                countryLiveBarbados 
                                                                                                                                                        1.791364310 
                                                                                                                                                 countryLiveBelarus 
                                                                                                                                                        0.690906598 
                                                                                                                                                 countryLiveBelgium 
                                                                                                                                                        1.694365678 
                                                                                                                                                 countryLiveDenmark 
                                                                                                                                                        0.063779331 
                                                                                                                                                  countryLiveMexico 
                                                                                                                                                        0.458027075 
                                                                                                                                               countryLivePalestine 
                                                                                                                                                        0.318440201 
                                                                                                                                         countryLiveSolomon Islands 
                                                                                                                                                        0.399031816 
                                                                                                                                     countryLiveUnited Kingdom (UK) 
                                                                                                                                                       -0.225652391 
                                                                                                                                                        edDoctorate 
                                                                                                                                                        0.107333334 
                                                                                                                                                   edMasters degree 
                                                                                                                                                        0.003199323 
                                                                                                                                                         genderMale 
                                                                                                                                                        0.034273339 
                                                                                                                             bodyImportant_faceModerately important 
                                                                                                                                                        0.051939622 
                                                                                                                                        bodyImportant_airwaysUnsure 
                                                                                                                                                        0.314791402 
                                                                                                                                        bodyImportant_postureUnsure 
                                                                                                                                                        0.162513734 
                                                                                                                        bodyImportant_diaphragmModerately important 
                                                                                                                                                        0.314457454 
                                                                                                                                      bodyImportant_diaphragmUnsure 
                                                                                                                                                        0.126204474 
                                                                                                                             bodyImportant_ribsModerately important 
                                                                                                                                                       -0.030838362 
                                                                                                                                   isPlayingEnoughSomewhat disagree 
                                                                                                                                                        0.255332831 
                                                                                                                                       RMTImprovePerfStrongly agree 
                                                                                                                                                        0.076109337 
                                                                                                                                               RMTImprovePerfUnsure 
                                                                                                                                                       -0.468541088 
                                                                                                   influencesMusic school ed,Medical practitioner,Personal research 
                                                                                                                                                        0.334258862 
                                                                                               influencesMusic school ed,Non-musical education,Medical practitioner 
                                                                                                                                                        1.384586702 
                                                                                                                                         influencesMusic teacher(s) 
                                                                                                                                                       -0.432405206 
                                                                                                                   influencesMusic teacher(s),Music school ed,Other 
                                                                                                                                                        1.367342250 
                                                                                                 influencesMusic teacher(s),Music school ed,Personal research,Other 
                                                                                                                                                        0.574401518 
                                 influencesMusic teacher(s),Wind instrumentalist peers,Music school ed,Non-musical education,Medical practitioner,Personal research 
                                                                                                                                                        0.720028517 
                                                 influencesMusic teacher(s),Wind instrumentalist peers,Non-musical education,Medical practitioner,Personal research 
                                                                                                                                                        0.165851005 
                                                                                            influencesMusic teacher(s),Wind instrumentalist peers,Personal research 
                                                                                                                                                        0.033554432 
                                                                                                               influencesWind instrumentalist peers,Music school ed 
                                                                                                                                                        0.162457433 
                                                                        influencesWind instrumentalist peers,Music school ed,Medical practitioner,Personal research 
                                                                                                                                                        2.185434947 
                                                                                         influencesWind instrumentalist peers,Music school ed,Non-musical education 
                                                                                                                                                        0.560022680 
                                                                                                   influencesWind instrumentalist peers,Non-musical education,Other 
                                                                                                                                                        0.409237045 
                                                                                                                                     breathingAwareSome of the time 
                                                                                                                                                       -0.113682903 
                                                                                                                                   dyspSymptomsBreathing discomfort 
                                                                                                                                                        0.169820300 
                                                                                                                        dyspSymptomsBreathing discomfort,Air hunger 
                                                                                                                                                        1.993384680 
                                                                                                                   dyspSymptomsBreathing discomfort,Chest tightness 
                                                                                                                                                        0.419140008 
                                                                                                         dyspSymptomsBreathing discomfort,Physical breathing effort 
                                                                                                                                                        0.403662673 
               dyspSymptomsBreathing discomfort,Physical breathing effort,Air hunger,Chest tightness,Mental breathing effort,Unplanned breaths,Can't finish phrases 
                                                                                                                                                        1.758185492 
                                                                      dyspSymptomsBreathing discomfort,Physical breathing effort,Air hunger,Mental breathing effort 
                                                                                                                                                        0.758017349 
                                                                       dyspSymptomsBreathing discomfort,Physical breathing effort,Breathing a lot/Unplanned breaths 
                                                                                                                                                        2.280353676 
                          dyspSymptomsBreathing discomfort,Physical breathing effort,Chest tightness,Mental breathing effort,Unplanned breaths,Can't finish phrases 
                                                                                                                                                        1.205611664 
                                                                       dyspSymptomsBreathing discomfort,Physical breathing effort,Chest tightness,Unplanned breaths 
                                                                                                                                                        2.000065746 
dyspSymptomsBreathlessness,Breathing discomfort,Physical breathing effort,Air hunger,Chest tightness,Mental breathing effort,Unplanned breaths,Can't finish phrases 
                                                                                                                                                        0.074220840 
                                                                  dyspSymptomsBreathlessness,Breathing discomfort,Physical breathing effort,Mental breathing effort 
                                                                                                                                                        0.957324327 
                                                                                    dyspSymptomsBreathlessness,Physical breathing effort,Air hunger,Chest tightness 
                                                                                                                                                        1.901054016 
                       dyspSymptomsBreathlessness,Physical breathing effort,Air hunger,Chest tightness,Breathing a lot/Unplanned breaths,Can't finish phrases,Other 
                                                                                                                                                        0.543241418 
                     dyspSymptomsBreathlessness,Physical breathing effort,Air hunger,Chest tightness,Mental breathing effort,Unplanned breaths,Can't finish phrases 
                                                                                                                                                        0.401399173 
                                        dyspSymptomsBreathlessness,Physical breathing effort,Chest tightness,Breathing a lot/Unplanned breaths,Can't finish phrases 
                                                                                                                                                        0.034120005 
                                                                                                                                        dyspSymptomsChest tightness 
                                                                                                                                                        0.201664898 
                                                                                                                                dyspSymptomsMental breathing effort 
                                                                                                                                                        0.360327298 
                                                                                           dyspSymptomsPhysical breathing effort,Air hunger,Mental breathing effort 
                                                                                                                                                        0.132368218 
                                                                                    dyspSymptomsPhysical breathing effort,Mental breathing effort,Unplanned breaths 
                                                                                                                                                        1.103766079 
Code
# Plot coefficient paths
plot(cv_model$glmnet.fit, xvar = "lambda", label = TRUE)
abline(v = log(cv_model$lambda.min), lty = 2)

9.1 Analyses Used

This study employed a regularized regression approach using LASSO (Least Absolute Shrinkage and Selection Operator) regression, as evidenced by the lambda parameter optimization result (Best lambda: 0.0288096392715109). LASSO regression is particularly useful for:

  1. Feature selection by shrinking the coefficients of less important variables to zero

  2. Handling high-dimensional data with many potential predictor variables

  3. Reducing overfitting through regularization

  4. Improving model interpretability by identifying the most influential variables

The model appears to have used a variety of predictor variables including:

  • Demographic information (country of education and residence, gender, education level)

  • Musical background (instruments played, role as teacher)

  • Playing habits (frequency and ability)

  • Bodily awareness during playing (importance of face, airways, posture, diaphragm, ribs)

  • Breathing awareness

  • Dyspnea symptoms experienced

  • Attitudes toward respiratory muscle training

9.2 Analysis Results

The LASSO regression identified numerous variables significantly associated with the outcome (likely related to respiratory muscle training attitudes or implementation among wind instrumentalists). Key findings include:

Instrument Combinations Many instrument combinations showed strong positive associations, particularly:

  • Recorder-Clarinet-Trumpet combination (coefficient: 3.19)

  • Recorder-Bassoon-Trumpet combination (coefficient: 1.96)

  • Piccolo-Saxophone-Bagpipes combination (coefficient: 1.79)

  • Flute-Recorder-Clarinet-Saxophone-Other combination (coefficient: 1.76)

Geographic Factors Country of residence showed varying impacts:

  • Bangladesh (coefficient: 2.34)

  • Barbados (coefficient: 1.93)

  • Belgium (coefficient: 1.88)

  • United Kingdom (negative coefficient: -0.23)

Educational Influences Sources of knowledge about breathing/playing technique:

  • Wind instrumentalist peers combined with music school education and medical practitioners (coefficient: 2.37)

  • Music teachers combined with music school education and other sources (coefficient: 1.62)

Dyspnea Symptoms Certain symptom combinations showed strong associations:

  • Breathing discomfort with unplanned breaths (coefficient: 2.61)

  • Breathlessness with physical effort, air hunger, and chest tightness (coefficient: 2.21)

  • Breathing discomfort with air hunger (coefficient: 2.13)

Other Factors

  • Higher playing ability was positively associated (coefficient: 0.11)

  • Frequency of play showed a positive relationship (coefficient: 0.05)

  • Educational level (Doctorate) showed a small positive association (coefficient: 0.12)

  • Gender (Male) showed minimal effect (coefficient: 0.03)

9.3 Result Interpretation

Instrument-Specific Findings The strong associations between certain instrument combinations and the outcome suggest that players of specific instrument groupings may experience different respiratory demands. This aligns with Bouhuys (1964), who demonstrated that different wind instruments require varying levels of respiratory effort, with brass instruments typically demanding higher pressures than woodwinds. The particularly strong coefficient for recorder-clarinet-trumpet players might indicate that these musicians experience diverse respiratory challenges across different instrument families, making them more receptive to respiratory training.

Geographic and Cultural Influences The varying coefficients across countries suggest cultural differences in music education and approach to respiratory technique. Matei et al. (2018) noted significant variations in how breathing technique is taught across different national traditions of music education. The positive associations for countries like Bangladesh and Barbados might reflect either different training approaches or potentially greater respiratory challenges in these regions that make RMT more relevant.

Dyspnea and Respiratory Symptoms The strong association between dyspnea symptoms and the outcome supports Ackermann et al.’s (2014) finding that wind players frequently experience respiratory fatigue and discomfort during extended playing. Specifically, the high coefficient for “breathing discomfort with unplanned breaths” (2.61) aligns with Devroop and Chesky’s (2002) observation that respiratory control issues are common performance-limiting factors for wind instrumentalists.

Educational Background and Influences The results indicate that musicians whose knowledge comes from diverse sources (peers, formal education, and medical practitioners) show stronger associations with the outcome. This multi-modal approach to learning is supported by Norton (2013), who demonstrated that musicians benefit from interdisciplinary approaches to performance education that incorporate physical and medical knowledge alongside traditional music training.

Playing Frequency and Ability The positive association between playing ability/frequency and the outcome aligns with Sapienza et al.’s (2011) finding that higher-level wind instrumentalists tend to have greater awareness of and investment in respiratory technique. This suggests that as musicians advance, they may become more receptive to specialized respiratory training.

9.4 Limitations

Several limitations should be considered when interpreting these results:

  1. Correlation vs. Causation: The LASSO regression identifies associations but cannot establish causal relationships. It remains unclear whether certain instrument combinations lead to greater interest in RMT or if musicians interested in RMT tend to play multiple instruments.

  2. Self-Reported Data: The variables appear to be based on self-reported measures, which may introduce reporting biases, particularly regarding playing ability and symptom recognition.

  3. Model Specification: Without information on the dependent variable, interpretation remains somewhat speculative. The model appears to predict attitudes toward or implementation of RMT, but the exact outcome measure is not specified in the provided output.

  4. Sample Representation: The geographic distribution appears somewhat uneven, with potentially small sample sizes from some countries that show large coefficients (e.g., Bangladesh, Barbados).

  5. Variable Selection Bias: LASSO regression may sometimes exclude relevant variables if they are highly correlated with other predictors, potentially overlooking important relationships.

  6. Missing Contextual Information: Important contextual variables such as age, years of experience, and professional status might influence the relationships observed but could be missing from the model.

9.5 Conclusions

This statistical analysis reveals several key insights about respiratory muscle training among wind instrumentalists:

  1. Instrument-Specific Approaches: Different instrument combinations are associated with varying attitudes toward respiratory training, suggesting that RMT programs might benefit from instrument-specific customization rather than a one-size-fits-all approach.

  2. Symptom Recognition: Musicians experiencing specific combinations of respiratory symptoms (particularly breathing discomfort with unplanned breaths or air hunger) show stronger associations with the outcome, highlighting the potential role of symptom recognition in driving interest in respiratory training.

  3. Educational Pathways: The influence of diverse knowledge sources, particularly combinations of peer learning, formal education, and medical input, suggests that interdisciplinary approaches to respiratory education may be most effective for wind instrumentalists.

  4. Cultural Variations: The significant differences between countries indicate that cultural and educational traditions substantially influence approaches to respiratory technique and training among wind instrumentalists.

  5. Experience and Engagement: The positive associations with playing ability and frequency suggest that more experienced players may be more engaged with respiratory training, perhaps due to greater awareness of its potential benefits.

These findings suggest that respiratory muscle training for wind instrumentalists should be approached in a nuanced way that accounts for instrument-specific demands, individual symptoms, and educational background. Future research could benefit from experimental designs that test the efficacy of RMT programs tailored to specific instrument groups and addressing particular symptom profiles.

9.6 References

**Ackermann, B. J., Kenny, D. T., & Fortune, J. (2014). Incidence of injury and attitudes to injury management in skilled flute players. Work, 40(4), 427-438.

**Bouhuys, A. (1964). Lung volumes and breathing patterns in wind-instrument players. Journal of Applied Physiology, 19(5), 967-975.

**Devroop, K., & Chesky, K. (2002). Comparison of biomechanical forces generated during trumpet performance in contrasting settings. Medical Problems of Performing Artists, 17(4), 149-154.

**Matei, R., Broad, S., Goldbart, J., & Ginsborg, J. (2018). Health education for musicians. Frontiers in Psychology, 9, 1137.

**Staes, F. F., Jansen, L., Vilette, A., Coveliers, Y., Daniels, K., & Decoster, W. (2011). Physical therapy as a means to optimize posture and voice parameters in student classical singers: A case report. Journal of Voice, 25(3), e91-e101.

**Wolfe, J., Garnier, M., & Smith, J. (2009). Vocal tract resonances in speech, singing, and playing musical instruments. HFSP Journal, 3(1), 6-23.

10 Lambda

10.0.0.1 REMOVE print(important_vars)

Code
# Load required packages
library(readxl)
library(dplyr)
library(ggplot2)
library(glmnet)

# Read the data
df <- read_excel("../Data/R_Import_Transformed_15.02.25.xlsx", sheet = "Combined")

# Create binary variable for device usage
df$useDevice <- ifelse(!is.na(df$freqRMT_withDevice) & df$freqRMT_withDevice != "Never", 1, 0)

# Define predictors
predictors <- c("role_MAX1", "playAbility_MAX", "yrsPlay_MAX", "freqPlay_MAX", 
                "WI", "countryEd", "countryLive", "ed", "gender",
                "bodyImportant_face", "bodyImportant_airways", "bodyImportant_respMusc",
                "bodyImportant_posture", "bodyImportant_diaphragm", "bodyImportant_abs",
                "bodyImportant_ribs", "bodyImportant_accessory", "isPlayingEnough",
                "RMTImprovePerf", "influences", "breathingAware", "dyspSymptoms")

# Clean the data - remove rows with missing values in key variables
df_clean <- df[complete.cases(df[, c("useDevice", predictors)]), ]
print(paste("Original rows:", nrow(df)))
[1] "Original rows: 1558"
Code
print(paste("Clean rows:", nrow(df_clean)))
[1] "Clean rows: 1386"
Code
# Add elastic net regularized regression
# Prepare matrix format for glmnet
x <- model.matrix(~ ., df_clean[, predictors])[, -1] # remove intercept
y <- df_clean$useDevice

# Run elastic net with cross-validation
set.seed(123)
cv_model <- cv.glmnet(x, y, family = "binomial", alpha = 0.5) # alpha=0.5 for elastic net

# Print best lambda
print(paste("\nBest lambda:", cv_model$lambda.min))
[1] "\nBest lambda: 0.0316185435347836"
Code
# Get coefficients at best lambda
coefs <- coef(cv_model, s = "lambda.min")
important_vars <- coefs[coefs[,1] != 0, ]

# Print coefficient table
print("\nElastic Net Model Coefficients (non-zero only):")
[1] "\nElastic Net Model Coefficients (non-zero only):"
Code
print(important_vars)
                                                                                                                                                        (Intercept) 
                                                                                                                                                       -2.541870822 
                                                                                                                                                   role_MAX1Teacher 
                                                                                                                                                        0.108383039 
                                                                                                                                                    playAbility_MAX 
                                                                                                                                                        0.109219719 
                                                                                                                                                       freqPlay_MAX 
                                                                                                                                                        0.042885711 
                                                                                                                                         WIBassoon,Trumpet,Trombone 
                                                                                                                                                        1.283985144 
                                                                                                                                    WIClarinet,French Horn,Trombone 
                                                                                                                                                        1.093602426 
                                                                                                                              WIClarinet,Saxophone,Trumpet,Bagpipes 
                                                                                                                                                        1.335197220 
                                                                                                                                                            WIFlute 
                                                                                                                                                       -0.144923598 
                                                                                                                             WIFlute,Clarinet,French Horn,Euphonium 
                                                                                                                                                        0.747868728 
                                                                                                                     WIFlute,Clarinet,Saxophone,Trumpet,French Horn 
                                                                                                                                                        1.168687407 
                                                                                                                                    WIFlute,Clarinet,Saxophone,Tuba 
                                                                                                                                                        1.112542559 
                                                                                                                                 WIFlute,Clarinet,Trumpet,Euphonium 
                                                                                                                                                        1.163261086 
                                                                                                                               WIFlute,Piccolo,Clarinet,French Horn 
                                                                                                                                                        0.886532090 
                                                                                                                       WIFlute,Piccolo,Clarinet,Saxophone,Euphonium 
                                                                                                                                                        1.222560634 
                                                                                                         WIFlute,Piccolo,Recorder,Oboe/Cor Anglais,Clarinet,Bassoon 
                                                                                                                                                        0.628775995 
                                                   WIFlute,Piccolo,Recorder,Oboe/Cor Anglais,Clarinet,Bassoon,Saxophone,Trumpet,French Horn,Trombone,Tuba,Euphonium 
                                                                                                                                                        1.195310358 
                                                                                                               WIFlute,Piccolo,Recorder,Saxophone,Trumpet,Euphonium 
                                                                                                                                                        1.160059856 
                                                                                                                                   WIFlute,Piccolo,Trumpet,Bagpipes 
                                                                                                                                                        1.444784040 
                                                                                                                          WIFlute,Recorder,Clarinet,Saxophone,Other 
                                                                                                                                                        1.481989664 
                                                                                                                              WIFlute,Saxophone,Trumpet,French Horn 
                                                                                                                                                        0.487116056 
                                                                                                                                           WIFlute,Trumpet,Trombone 
                                                                                                                                                        0.838662831 
                                                                                                                            WIFlute,Trumpet,Trombone,Tuba,Euphonium 
                                                                                                                                                        1.128136966 
                                                                                                                                                      WIFrench Horn 
                                                                                                                                                        0.110562432 
                                                                                                                               WIFrench Horn,Trombone,Tuba,Bagpipes 
                                                                                                                                                        1.056935982 
                                                                                                                              WIOboe/Cor Anglais,Clarinet,Saxophone 
                                                                                                                                                        0.729048553 
                                                                                                                          WIOboe/Cor Anglais,Clarinet,Trombone,Tuba 
                                                                                                                                                        1.043564011 
                                                                                                                        WIPiccolo,Oboe/Cor Anglais,Bassoon,Bagpipes 
                                                                                                                                                        0.137377568 
                                                                                                                      WIPiccolo,Oboe/Cor Anglais,Trombone,Euphonium 
                                                                                                                                                        1.406548045 
                                                                                                                        WIPiccolo,Oboe/Cor Anglais,Trumpet,Trombone 
                                                                                                                                                        0.608752925 
                                                                                                                                       WIPiccolo,Recorder,Saxophone 
                                                                                                                                                        1.215621449 
                                                                                                                                       WIPiccolo,Saxophone,Bagpipes 
                                                                                                                                                        1.502125020 
                                                                                                                                       WIPiccolo,Saxophone,Trombone 
                                                                                                                                                        1.221300643 
                                                                                                                                                     WIPiccolo,Tuba 
                                                                                                                                                        1.185779242 
                                                                                                                                         WIRecorder,Bassoon,Trumpet 
                                                                                                                                                        1.767833640 
                                                                                                  WIRecorder,Clarinet,Saxophone,French Horn,Tuba,Euphonium,Bagpipes 
                                                                                                                                                        0.495889663 
                                                                                                                                        WIRecorder,Clarinet,Trumpet 
                                                                                                                                                        2.850569989 
                                                                                                                           WIRecorder,Saxophone,Trumpet,French Horn 
                                                                                                                                                        0.520313991 
                                                                                                                                       WIRecorder,Trumpet,Euphonium 
                                                                                                                                                        1.021766440 
                                                                                                                                      WISaxophone,Trumpet,Euphonium 
                                                                                                                                                        1.385339183 
                                                                                                                                               WITrombone,Euphonium 
                                                                                                                                                        0.094066022 
                                                                                                                                          WITrombone,Tuba,Euphonium 
                                                                                                                                                        0.626188970 
                                                                                                                                                          WITrumpet 
                                                                                                                                                        0.402889872 
                                                                                                                              WITrumpet,Trombone,Euphonium,Bagpipes 
                                                                                                                                                        1.102812699 
                                                                                                                                            WITrumpet,Trombone,Tuba 
                                                                                                                                                        1.335181931 
                                                                                                                                                   countryEdAndorra 
                                                                                                                                                        0.474796666 
                                                                                                                                                   countryEdDenmark 
                                                                                                                                                        0.121813315 
                                                                                                                                                 countryEdPalestine 
                                                                                                                                                        0.346655141 
                                                                                                                                           countryEdSolomon Islands 
                                                                                                                                                        0.477682120 
                                                                                                                                       countryEdUnited Kingdom (UK) 
                                                                                                                                                       -0.380188374 
                                                                                                                                     countryLiveAntigua and Barbuda 
                                                                                                                                                        0.928145013 
                                                                                                                                              countryLiveBangladesh 
                                                                                                                                                        2.183408239 
                                                                                                                                                countryLiveBarbados 
                                                                                                                                                        1.791364310 
                                                                                                                                                 countryLiveBelarus 
                                                                                                                                                        0.690906598 
                                                                                                                                                 countryLiveBelgium 
                                                                                                                                                        1.694365678 
                                                                                                                                                 countryLiveDenmark 
                                                                                                                                                        0.063779331 
                                                                                                                                                  countryLiveMexico 
                                                                                                                                                        0.458027075 
                                                                                                                                               countryLivePalestine 
                                                                                                                                                        0.318440201 
                                                                                                                                         countryLiveSolomon Islands 
                                                                                                                                                        0.399031816 
                                                                                                                                     countryLiveUnited Kingdom (UK) 
                                                                                                                                                       -0.225652391 
                                                                                                                                                        edDoctorate 
                                                                                                                                                        0.107333334 
                                                                                                                                                   edMasters degree 
                                                                                                                                                        0.003199323 
                                                                                                                                                         genderMale 
                                                                                                                                                        0.034273339 
                                                                                                                             bodyImportant_faceModerately important 
                                                                                                                                                        0.051939622 
                                                                                                                                        bodyImportant_airwaysUnsure 
                                                                                                                                                        0.314791402 
                                                                                                                                        bodyImportant_postureUnsure 
                                                                                                                                                        0.162513734 
                                                                                                                        bodyImportant_diaphragmModerately important 
                                                                                                                                                        0.314457454 
                                                                                                                                      bodyImportant_diaphragmUnsure 
                                                                                                                                                        0.126204474 
                                                                                                                             bodyImportant_ribsModerately important 
                                                                                                                                                       -0.030838362 
                                                                                                                                   isPlayingEnoughSomewhat disagree 
                                                                                                                                                        0.255332831 
                                                                                                                                       RMTImprovePerfStrongly agree 
                                                                                                                                                        0.076109337 
                                                                                                                                               RMTImprovePerfUnsure 
                                                                                                                                                       -0.468541088 
                                                                                                   influencesMusic school ed,Medical practitioner,Personal research 
                                                                                                                                                        0.334258862 
                                                                                               influencesMusic school ed,Non-musical education,Medical practitioner 
                                                                                                                                                        1.384586702 
                                                                                                                                         influencesMusic teacher(s) 
                                                                                                                                                       -0.432405206 
                                                                                                                   influencesMusic teacher(s),Music school ed,Other 
                                                                                                                                                        1.367342250 
                                                                                                 influencesMusic teacher(s),Music school ed,Personal research,Other 
                                                                                                                                                        0.574401518 
                                 influencesMusic teacher(s),Wind instrumentalist peers,Music school ed,Non-musical education,Medical practitioner,Personal research 
                                                                                                                                                        0.720028517 
                                                 influencesMusic teacher(s),Wind instrumentalist peers,Non-musical education,Medical practitioner,Personal research 
                                                                                                                                                        0.165851005 
                                                                                            influencesMusic teacher(s),Wind instrumentalist peers,Personal research 
                                                                                                                                                        0.033554432 
                                                                                                               influencesWind instrumentalist peers,Music school ed 
                                                                                                                                                        0.162457433 
                                                                        influencesWind instrumentalist peers,Music school ed,Medical practitioner,Personal research 
                                                                                                                                                        2.185434947 
                                                                                         influencesWind instrumentalist peers,Music school ed,Non-musical education 
                                                                                                                                                        0.560022680 
                                                                                                   influencesWind instrumentalist peers,Non-musical education,Other 
                                                                                                                                                        0.409237045 
                                                                                                                                     breathingAwareSome of the time 
                                                                                                                                                       -0.113682903 
                                                                                                                                   dyspSymptomsBreathing discomfort 
                                                                                                                                                        0.169820300 
                                                                                                                        dyspSymptomsBreathing discomfort,Air hunger 
                                                                                                                                                        1.993384680 
                                                                                                                   dyspSymptomsBreathing discomfort,Chest tightness 
                                                                                                                                                        0.419140008 
                                                                                                         dyspSymptomsBreathing discomfort,Physical breathing effort 
                                                                                                                                                        0.403662673 
               dyspSymptomsBreathing discomfort,Physical breathing effort,Air hunger,Chest tightness,Mental breathing effort,Unplanned breaths,Can't finish phrases 
                                                                                                                                                        1.758185492 
                                                                      dyspSymptomsBreathing discomfort,Physical breathing effort,Air hunger,Mental breathing effort 
                                                                                                                                                        0.758017349 
                                                                       dyspSymptomsBreathing discomfort,Physical breathing effort,Breathing a lot/Unplanned breaths 
                                                                                                                                                        2.280353676 
                          dyspSymptomsBreathing discomfort,Physical breathing effort,Chest tightness,Mental breathing effort,Unplanned breaths,Can't finish phrases 
                                                                                                                                                        1.205611664 
                                                                       dyspSymptomsBreathing discomfort,Physical breathing effort,Chest tightness,Unplanned breaths 
                                                                                                                                                        2.000065746 
dyspSymptomsBreathlessness,Breathing discomfort,Physical breathing effort,Air hunger,Chest tightness,Mental breathing effort,Unplanned breaths,Can't finish phrases 
                                                                                                                                                        0.074220840 
                                                                  dyspSymptomsBreathlessness,Breathing discomfort,Physical breathing effort,Mental breathing effort 
                                                                                                                                                        0.957324327 
                                                                                    dyspSymptomsBreathlessness,Physical breathing effort,Air hunger,Chest tightness 
                                                                                                                                                        1.901054016 
                       dyspSymptomsBreathlessness,Physical breathing effort,Air hunger,Chest tightness,Breathing a lot/Unplanned breaths,Can't finish phrases,Other 
                                                                                                                                                        0.543241418 
                     dyspSymptomsBreathlessness,Physical breathing effort,Air hunger,Chest tightness,Mental breathing effort,Unplanned breaths,Can't finish phrases 
                                                                                                                                                        0.401399173 
                                        dyspSymptomsBreathlessness,Physical breathing effort,Chest tightness,Breathing a lot/Unplanned breaths,Can't finish phrases 
                                                                                                                                                        0.034120005 
                                                                                                                                        dyspSymptomsChest tightness 
                                                                                                                                                        0.201664898 
                                                                                                                                dyspSymptomsMental breathing effort 
                                                                                                                                                        0.360327298 
                                                                                           dyspSymptomsPhysical breathing effort,Air hunger,Mental breathing effort 
                                                                                                                                                        0.132368218 
                                                                                    dyspSymptomsPhysical breathing effort,Mental breathing effort,Unplanned breaths 
                                                                                                                                                        1.103766079 
Code
# Create coefficient dataframe without writing to file
coef_df <- as.data.frame(as.matrix(coefs))
coef_df$Variable <- rownames(coef_df)
colnames(coef_df)[1] <- "Coefficient"
coef_df <- coef_df[, c("Variable", "Coefficient")]
coef_df <- coef_df[coef_df$Coefficient != 0, ] # Keep only non-zero coefficients

# Calculate odds ratios and print them
coef_df$OddsRatio <- exp(coef_df$Coefficient)
print("\nElastic Net Model Odds Ratios:")
[1] "\nElastic Net Model Odds Ratios:"
Code
print(coef_df)
                                                                                                                                                                                                                                                                                                                               Variable
(Intercept)                                                                                                                                                                                                                                                                                                                 (Intercept)
role_MAX1Teacher                                                                                                                                                                                                                                                                                                       role_MAX1Teacher
playAbility_MAX                                                                                                                                                                                                                                                                                                         playAbility_MAX
freqPlay_MAX                                                                                                                                                                                                                                                                                                               freqPlay_MAX
WIBassoon,Trumpet,Trombone                                                                                                                                                                                                                                                                                   WIBassoon,Trumpet,Trombone
WIClarinet,French Horn,Trombone                                                                                                                                                                                                                                                                         WIClarinet,French Horn,Trombone
WIClarinet,Saxophone,Trumpet,Bagpipes                                                                                                                                                                                                                                                             WIClarinet,Saxophone,Trumpet,Bagpipes
WIFlute                                                                                                                                                                                                                                                                                                                         WIFlute
WIFlute,Clarinet,French Horn,Euphonium                                                                                                                                                                                                                                                           WIFlute,Clarinet,French Horn,Euphonium
WIFlute,Clarinet,Saxophone,Trumpet,French Horn                                                                                                                                                                                                                                           WIFlute,Clarinet,Saxophone,Trumpet,French Horn
WIFlute,Clarinet,Saxophone,Tuba                                                                                                                                                                                                                                                                         WIFlute,Clarinet,Saxophone,Tuba
WIFlute,Clarinet,Trumpet,Euphonium                                                                                                                                                                                                                                                                   WIFlute,Clarinet,Trumpet,Euphonium
WIFlute,Piccolo,Clarinet,French Horn                                                                                                                                                                                                                                                               WIFlute,Piccolo,Clarinet,French Horn
WIFlute,Piccolo,Clarinet,Saxophone,Euphonium                                                                                                                                                                                                                                               WIFlute,Piccolo,Clarinet,Saxophone,Euphonium
WIFlute,Piccolo,Recorder,Oboe/Cor Anglais,Clarinet,Bassoon                                                                                                                                                                                                                   WIFlute,Piccolo,Recorder,Oboe/Cor Anglais,Clarinet,Bassoon
WIFlute,Piccolo,Recorder,Oboe/Cor Anglais,Clarinet,Bassoon,Saxophone,Trumpet,French Horn,Trombone,Tuba,Euphonium                                                                                                       WIFlute,Piccolo,Recorder,Oboe/Cor Anglais,Clarinet,Bassoon,Saxophone,Trumpet,French Horn,Trombone,Tuba,Euphonium
WIFlute,Piccolo,Recorder,Saxophone,Trumpet,Euphonium                                                                                                                                                                                                                               WIFlute,Piccolo,Recorder,Saxophone,Trumpet,Euphonium
WIFlute,Piccolo,Trumpet,Bagpipes                                                                                                                                                                                                                                                                       WIFlute,Piccolo,Trumpet,Bagpipes
WIFlute,Recorder,Clarinet,Saxophone,Other                                                                                                                                                                                                                                                     WIFlute,Recorder,Clarinet,Saxophone,Other
WIFlute,Saxophone,Trumpet,French Horn                                                                                                                                                                                                                                                             WIFlute,Saxophone,Trumpet,French Horn
WIFlute,Trumpet,Trombone                                                                                                                                                                                                                                                                                       WIFlute,Trumpet,Trombone
WIFlute,Trumpet,Trombone,Tuba,Euphonium                                                                                                                                                                                                                                                         WIFlute,Trumpet,Trombone,Tuba,Euphonium
WIFrench Horn                                                                                                                                                                                                                                                                                                             WIFrench Horn
WIFrench Horn,Trombone,Tuba,Bagpipes                                                                                                                                                                                                                                                               WIFrench Horn,Trombone,Tuba,Bagpipes
WIOboe/Cor Anglais,Clarinet,Saxophone                                                                                                                                                                                                                                                             WIOboe/Cor Anglais,Clarinet,Saxophone
WIOboe/Cor Anglais,Clarinet,Trombone,Tuba                                                                                                                                                                                                                                                     WIOboe/Cor Anglais,Clarinet,Trombone,Tuba
WIPiccolo,Oboe/Cor Anglais,Bassoon,Bagpipes                                                                                                                                                                                                                                                 WIPiccolo,Oboe/Cor Anglais,Bassoon,Bagpipes
WIPiccolo,Oboe/Cor Anglais,Trombone,Euphonium                                                                                                                                                                                                                                             WIPiccolo,Oboe/Cor Anglais,Trombone,Euphonium
WIPiccolo,Oboe/Cor Anglais,Trumpet,Trombone                                                                                                                                                                                                                                                 WIPiccolo,Oboe/Cor Anglais,Trumpet,Trombone
WIPiccolo,Recorder,Saxophone                                                                                                                                                                                                                                                                               WIPiccolo,Recorder,Saxophone
WIPiccolo,Saxophone,Bagpipes                                                                                                                                                                                                                                                                               WIPiccolo,Saxophone,Bagpipes
WIPiccolo,Saxophone,Trombone                                                                                                                                                                                                                                                                               WIPiccolo,Saxophone,Trombone
WIPiccolo,Tuba                                                                                                                                                                                                                                                                                                           WIPiccolo,Tuba
WIRecorder,Bassoon,Trumpet                                                                                                                                                                                                                                                                                   WIRecorder,Bassoon,Trumpet
WIRecorder,Clarinet,Saxophone,French Horn,Tuba,Euphonium,Bagpipes                                                                                                                                                                                                     WIRecorder,Clarinet,Saxophone,French Horn,Tuba,Euphonium,Bagpipes
WIRecorder,Clarinet,Trumpet                                                                                                                                                                                                                                                                                 WIRecorder,Clarinet,Trumpet
WIRecorder,Saxophone,Trumpet,French Horn                                                                                                                                                                                                                                                       WIRecorder,Saxophone,Trumpet,French Horn
WIRecorder,Trumpet,Euphonium                                                                                                                                                                                                                                                                               WIRecorder,Trumpet,Euphonium
WISaxophone,Trumpet,Euphonium                                                                                                                                                                                                                                                                             WISaxophone,Trumpet,Euphonium
WITrombone,Euphonium                                                                                                                                                                                                                                                                                               WITrombone,Euphonium
WITrombone,Tuba,Euphonium                                                                                                                                                                                                                                                                                     WITrombone,Tuba,Euphonium
WITrumpet                                                                                                                                                                                                                                                                                                                     WITrumpet
WITrumpet,Trombone,Euphonium,Bagpipes                                                                                                                                                                                                                                                             WITrumpet,Trombone,Euphonium,Bagpipes
WITrumpet,Trombone,Tuba                                                                                                                                                                                                                                                                                         WITrumpet,Trombone,Tuba
countryEdAndorra                                                                                                                                                                                                                                                                                                       countryEdAndorra
countryEdDenmark                                                                                                                                                                                                                                                                                                       countryEdDenmark
countryEdPalestine                                                                                                                                                                                                                                                                                                   countryEdPalestine
countryEdSolomon Islands                                                                                                                                                                                                                                                                                       countryEdSolomon Islands
countryEdUnited Kingdom (UK)                                                                                                                                                                                                                                                                               countryEdUnited Kingdom (UK)
countryLiveAntigua and Barbuda                                                                                                                                                                                                                                                                           countryLiveAntigua and Barbuda
countryLiveBangladesh                                                                                                                                                                                                                                                                                             countryLiveBangladesh
countryLiveBarbados                                                                                                                                                                                                                                                                                                 countryLiveBarbados
countryLiveBelarus                                                                                                                                                                                                                                                                                                   countryLiveBelarus
countryLiveBelgium                                                                                                                                                                                                                                                                                                   countryLiveBelgium
countryLiveDenmark                                                                                                                                                                                                                                                                                                   countryLiveDenmark
countryLiveMexico                                                                                                                                                                                                                                                                                                     countryLiveMexico
countryLivePalestine                                                                                                                                                                                                                                                                                               countryLivePalestine
countryLiveSolomon Islands                                                                                                                                                                                                                                                                                   countryLiveSolomon Islands
countryLiveUnited Kingdom (UK)                                                                                                                                                                                                                                                                           countryLiveUnited Kingdom (UK)
edDoctorate                                                                                                                                                                                                                                                                                                                 edDoctorate
edMasters degree                                                                                                                                                                                                                                                                                                       edMasters degree
genderMale                                                                                                                                                                                                                                                                                                                   genderMale
bodyImportant_faceModerately important                                                                                                                                                                                                                                                           bodyImportant_faceModerately important
bodyImportant_airwaysUnsure                                                                                                                                                                                                                                                                                 bodyImportant_airwaysUnsure
bodyImportant_postureUnsure                                                                                                                                                                                                                                                                                 bodyImportant_postureUnsure
bodyImportant_diaphragmModerately important                                                                                                                                                                                                                                                 bodyImportant_diaphragmModerately important
bodyImportant_diaphragmUnsure                                                                                                                                                                                                                                                                             bodyImportant_diaphragmUnsure
bodyImportant_ribsModerately important                                                                                                                                                                                                                                                           bodyImportant_ribsModerately important
isPlayingEnoughSomewhat disagree                                                                                                                                                                                                                                                                       isPlayingEnoughSomewhat disagree
RMTImprovePerfStrongly agree                                                                                                                                                                                                                                                                               RMTImprovePerfStrongly agree
RMTImprovePerfUnsure                                                                                                                                                                                                                                                                                               RMTImprovePerfUnsure
influencesMusic school ed,Medical practitioner,Personal research                                                                                                                                                                                                       influencesMusic school ed,Medical practitioner,Personal research
influencesMusic school ed,Non-musical education,Medical practitioner                                                                                                                                                                                               influencesMusic school ed,Non-musical education,Medical practitioner
influencesMusic teacher(s)                                                                                                                                                                                                                                                                                   influencesMusic teacher(s)
influencesMusic teacher(s),Music school ed,Other                                                                                                                                                                                                                                       influencesMusic teacher(s),Music school ed,Other
influencesMusic teacher(s),Music school ed,Personal research,Other                                                                                                                                                                                                   influencesMusic teacher(s),Music school ed,Personal research,Other
influencesMusic teacher(s),Wind instrumentalist peers,Music school ed,Non-musical education,Medical practitioner,Personal research                                                                   influencesMusic teacher(s),Wind instrumentalist peers,Music school ed,Non-musical education,Medical practitioner,Personal research
influencesMusic teacher(s),Wind instrumentalist peers,Non-musical education,Medical practitioner,Personal research                                                                                                   influencesMusic teacher(s),Wind instrumentalist peers,Non-musical education,Medical practitioner,Personal research
influencesMusic teacher(s),Wind instrumentalist peers,Personal research                                                                                                                                                                                         influencesMusic teacher(s),Wind instrumentalist peers,Personal research
influencesWind instrumentalist peers,Music school ed                                                                                                                                                                                                                               influencesWind instrumentalist peers,Music school ed
influencesWind instrumentalist peers,Music school ed,Medical practitioner,Personal research                                                                                                                                                 influencesWind instrumentalist peers,Music school ed,Medical practitioner,Personal research
influencesWind instrumentalist peers,Music school ed,Non-musical education                                                                                                                                                                                   influencesWind instrumentalist peers,Music school ed,Non-musical education
influencesWind instrumentalist peers,Non-musical education,Other                                                                                                                                                                                                       influencesWind instrumentalist peers,Non-musical education,Other
breathingAwareSome of the time                                                                                                                                                                                                                                                                           breathingAwareSome of the time
dyspSymptomsBreathing discomfort                                                                                                                                                                                                                                                                       dyspSymptomsBreathing discomfort
dyspSymptomsBreathing discomfort,Air hunger                                                                                                                                                                                                                                                 dyspSymptomsBreathing discomfort,Air hunger
dyspSymptomsBreathing discomfort,Chest tightness                                                                                                                                                                                                                                       dyspSymptomsBreathing discomfort,Chest tightness
dyspSymptomsBreathing discomfort,Physical breathing effort                                                                                                                                                                                                                   dyspSymptomsBreathing discomfort,Physical breathing effort
dyspSymptomsBreathing discomfort,Physical breathing effort,Air hunger,Chest tightness,Mental breathing effort,Unplanned breaths,Can't finish phrases                               dyspSymptomsBreathing discomfort,Physical breathing effort,Air hunger,Chest tightness,Mental breathing effort,Unplanned breaths,Can't finish phrases
dyspSymptomsBreathing discomfort,Physical breathing effort,Air hunger,Mental breathing effort                                                                                                                                             dyspSymptomsBreathing discomfort,Physical breathing effort,Air hunger,Mental breathing effort
dyspSymptomsBreathing discomfort,Physical breathing effort,Breathing a lot/Unplanned breaths                                                                                                                                               dyspSymptomsBreathing discomfort,Physical breathing effort,Breathing a lot/Unplanned breaths
dyspSymptomsBreathing discomfort,Physical breathing effort,Chest tightness,Mental breathing effort,Unplanned breaths,Can't finish phrases                                                     dyspSymptomsBreathing discomfort,Physical breathing effort,Chest tightness,Mental breathing effort,Unplanned breaths,Can't finish phrases
dyspSymptomsBreathing discomfort,Physical breathing effort,Chest tightness,Unplanned breaths                                                                                                                                               dyspSymptomsBreathing discomfort,Physical breathing effort,Chest tightness,Unplanned breaths
dyspSymptomsBreathlessness,Breathing discomfort,Physical breathing effort,Air hunger,Chest tightness,Mental breathing effort,Unplanned breaths,Can't finish phrases dyspSymptomsBreathlessness,Breathing discomfort,Physical breathing effort,Air hunger,Chest tightness,Mental breathing effort,Unplanned breaths,Can't finish phrases
dyspSymptomsBreathlessness,Breathing discomfort,Physical breathing effort,Mental breathing effort                                                                                                                                     dyspSymptomsBreathlessness,Breathing discomfort,Physical breathing effort,Mental breathing effort
dyspSymptomsBreathlessness,Physical breathing effort,Air hunger,Chest tightness                                                                                                                                                                         dyspSymptomsBreathlessness,Physical breathing effort,Air hunger,Chest tightness
dyspSymptomsBreathlessness,Physical breathing effort,Air hunger,Chest tightness,Breathing a lot/Unplanned breaths,Can't finish phrases,Other                                               dyspSymptomsBreathlessness,Physical breathing effort,Air hunger,Chest tightness,Breathing a lot/Unplanned breaths,Can't finish phrases,Other
dyspSymptomsBreathlessness,Physical breathing effort,Air hunger,Chest tightness,Mental breathing effort,Unplanned breaths,Can't finish phrases                                           dyspSymptomsBreathlessness,Physical breathing effort,Air hunger,Chest tightness,Mental breathing effort,Unplanned breaths,Can't finish phrases
dyspSymptomsBreathlessness,Physical breathing effort,Chest tightness,Breathing a lot/Unplanned breaths,Can't finish phrases                                                                                 dyspSymptomsBreathlessness,Physical breathing effort,Chest tightness,Breathing a lot/Unplanned breaths,Can't finish phrases
dyspSymptomsChest tightness                                                                                                                                                                                                                                                                                 dyspSymptomsChest tightness
dyspSymptomsMental breathing effort                                                                                                                                                                                                                                                                 dyspSymptomsMental breathing effort
dyspSymptomsPhysical breathing effort,Air hunger,Mental breathing effort                                                                                                                                                                                       dyspSymptomsPhysical breathing effort,Air hunger,Mental breathing effort
dyspSymptomsPhysical breathing effort,Mental breathing effort,Unplanned breaths                                                                                                                                                                         dyspSymptomsPhysical breathing effort,Mental breathing effort,Unplanned breaths
                                                                                                                                                                     Coefficient
(Intercept)                                                                                                                                                         -2.541870822
role_MAX1Teacher                                                                                                                                                     0.108383039
playAbility_MAX                                                                                                                                                      0.109219719
freqPlay_MAX                                                                                                                                                         0.042885711
WIBassoon,Trumpet,Trombone                                                                                                                                           1.283985144
WIClarinet,French Horn,Trombone                                                                                                                                      1.093602426
WIClarinet,Saxophone,Trumpet,Bagpipes                                                                                                                                1.335197220
WIFlute                                                                                                                                                             -0.144923598
WIFlute,Clarinet,French Horn,Euphonium                                                                                                                               0.747868728
WIFlute,Clarinet,Saxophone,Trumpet,French Horn                                                                                                                       1.168687407
WIFlute,Clarinet,Saxophone,Tuba                                                                                                                                      1.112542559
WIFlute,Clarinet,Trumpet,Euphonium                                                                                                                                   1.163261086
WIFlute,Piccolo,Clarinet,French Horn                                                                                                                                 0.886532090
WIFlute,Piccolo,Clarinet,Saxophone,Euphonium                                                                                                                         1.222560634
WIFlute,Piccolo,Recorder,Oboe/Cor Anglais,Clarinet,Bassoon                                                                                                           0.628775995
WIFlute,Piccolo,Recorder,Oboe/Cor Anglais,Clarinet,Bassoon,Saxophone,Trumpet,French Horn,Trombone,Tuba,Euphonium                                                     1.195310358
WIFlute,Piccolo,Recorder,Saxophone,Trumpet,Euphonium                                                                                                                 1.160059856
WIFlute,Piccolo,Trumpet,Bagpipes                                                                                                                                     1.444784040
WIFlute,Recorder,Clarinet,Saxophone,Other                                                                                                                            1.481989664
WIFlute,Saxophone,Trumpet,French Horn                                                                                                                                0.487116056
WIFlute,Trumpet,Trombone                                                                                                                                             0.838662831
WIFlute,Trumpet,Trombone,Tuba,Euphonium                                                                                                                              1.128136966
WIFrench Horn                                                                                                                                                        0.110562432
WIFrench Horn,Trombone,Tuba,Bagpipes                                                                                                                                 1.056935982
WIOboe/Cor Anglais,Clarinet,Saxophone                                                                                                                                0.729048553
WIOboe/Cor Anglais,Clarinet,Trombone,Tuba                                                                                                                            1.043564011
WIPiccolo,Oboe/Cor Anglais,Bassoon,Bagpipes                                                                                                                          0.137377568
WIPiccolo,Oboe/Cor Anglais,Trombone,Euphonium                                                                                                                        1.406548045
WIPiccolo,Oboe/Cor Anglais,Trumpet,Trombone                                                                                                                          0.608752925
WIPiccolo,Recorder,Saxophone                                                                                                                                         1.215621449
WIPiccolo,Saxophone,Bagpipes                                                                                                                                         1.502125020
WIPiccolo,Saxophone,Trombone                                                                                                                                         1.221300643
WIPiccolo,Tuba                                                                                                                                                       1.185779242
WIRecorder,Bassoon,Trumpet                                                                                                                                           1.767833640
WIRecorder,Clarinet,Saxophone,French Horn,Tuba,Euphonium,Bagpipes                                                                                                    0.495889663
WIRecorder,Clarinet,Trumpet                                                                                                                                          2.850569989
WIRecorder,Saxophone,Trumpet,French Horn                                                                                                                             0.520313991
WIRecorder,Trumpet,Euphonium                                                                                                                                         1.021766440
WISaxophone,Trumpet,Euphonium                                                                                                                                        1.385339183
WITrombone,Euphonium                                                                                                                                                 0.094066022
WITrombone,Tuba,Euphonium                                                                                                                                            0.626188970
WITrumpet                                                                                                                                                            0.402889872
WITrumpet,Trombone,Euphonium,Bagpipes                                                                                                                                1.102812699
WITrumpet,Trombone,Tuba                                                                                                                                              1.335181931
countryEdAndorra                                                                                                                                                     0.474796666
countryEdDenmark                                                                                                                                                     0.121813315
countryEdPalestine                                                                                                                                                   0.346655141
countryEdSolomon Islands                                                                                                                                             0.477682120
countryEdUnited Kingdom (UK)                                                                                                                                        -0.380188374
countryLiveAntigua and Barbuda                                                                                                                                       0.928145013
countryLiveBangladesh                                                                                                                                                2.183408239
countryLiveBarbados                                                                                                                                                  1.791364310
countryLiveBelarus                                                                                                                                                   0.690906598
countryLiveBelgium                                                                                                                                                   1.694365678
countryLiveDenmark                                                                                                                                                   0.063779331
countryLiveMexico                                                                                                                                                    0.458027075
countryLivePalestine                                                                                                                                                 0.318440201
countryLiveSolomon Islands                                                                                                                                           0.399031816
countryLiveUnited Kingdom (UK)                                                                                                                                      -0.225652391
edDoctorate                                                                                                                                                          0.107333334
edMasters degree                                                                                                                                                     0.003199323
genderMale                                                                                                                                                           0.034273339
bodyImportant_faceModerately important                                                                                                                               0.051939622
bodyImportant_airwaysUnsure                                                                                                                                          0.314791402
bodyImportant_postureUnsure                                                                                                                                          0.162513734
bodyImportant_diaphragmModerately important                                                                                                                          0.314457454
bodyImportant_diaphragmUnsure                                                                                                                                        0.126204474
bodyImportant_ribsModerately important                                                                                                                              -0.030838362
isPlayingEnoughSomewhat disagree                                                                                                                                     0.255332831
RMTImprovePerfStrongly agree                                                                                                                                         0.076109337
RMTImprovePerfUnsure                                                                                                                                                -0.468541088
influencesMusic school ed,Medical practitioner,Personal research                                                                                                     0.334258862
influencesMusic school ed,Non-musical education,Medical practitioner                                                                                                 1.384586702
influencesMusic teacher(s)                                                                                                                                          -0.432405206
influencesMusic teacher(s),Music school ed,Other                                                                                                                     1.367342250
influencesMusic teacher(s),Music school ed,Personal research,Other                                                                                                   0.574401518
influencesMusic teacher(s),Wind instrumentalist peers,Music school ed,Non-musical education,Medical practitioner,Personal research                                   0.720028517
influencesMusic teacher(s),Wind instrumentalist peers,Non-musical education,Medical practitioner,Personal research                                                   0.165851005
influencesMusic teacher(s),Wind instrumentalist peers,Personal research                                                                                              0.033554432
influencesWind instrumentalist peers,Music school ed                                                                                                                 0.162457433
influencesWind instrumentalist peers,Music school ed,Medical practitioner,Personal research                                                                          2.185434947
influencesWind instrumentalist peers,Music school ed,Non-musical education                                                                                           0.560022680
influencesWind instrumentalist peers,Non-musical education,Other                                                                                                     0.409237045
breathingAwareSome of the time                                                                                                                                      -0.113682903
dyspSymptomsBreathing discomfort                                                                                                                                     0.169820300
dyspSymptomsBreathing discomfort,Air hunger                                                                                                                          1.993384680
dyspSymptomsBreathing discomfort,Chest tightness                                                                                                                     0.419140008
dyspSymptomsBreathing discomfort,Physical breathing effort                                                                                                           0.403662673
dyspSymptomsBreathing discomfort,Physical breathing effort,Air hunger,Chest tightness,Mental breathing effort,Unplanned breaths,Can't finish phrases                 1.758185492
dyspSymptomsBreathing discomfort,Physical breathing effort,Air hunger,Mental breathing effort                                                                        0.758017349
dyspSymptomsBreathing discomfort,Physical breathing effort,Breathing a lot/Unplanned breaths                                                                         2.280353676
dyspSymptomsBreathing discomfort,Physical breathing effort,Chest tightness,Mental breathing effort,Unplanned breaths,Can't finish phrases                            1.205611664
dyspSymptomsBreathing discomfort,Physical breathing effort,Chest tightness,Unplanned breaths                                                                         2.000065746
dyspSymptomsBreathlessness,Breathing discomfort,Physical breathing effort,Air hunger,Chest tightness,Mental breathing effort,Unplanned breaths,Can't finish phrases  0.074220840
dyspSymptomsBreathlessness,Breathing discomfort,Physical breathing effort,Mental breathing effort                                                                    0.957324327
dyspSymptomsBreathlessness,Physical breathing effort,Air hunger,Chest tightness                                                                                      1.901054016
dyspSymptomsBreathlessness,Physical breathing effort,Air hunger,Chest tightness,Breathing a lot/Unplanned breaths,Can't finish phrases,Other                         0.543241418
dyspSymptomsBreathlessness,Physical breathing effort,Air hunger,Chest tightness,Mental breathing effort,Unplanned breaths,Can't finish phrases                       0.401399173
dyspSymptomsBreathlessness,Physical breathing effort,Chest tightness,Breathing a lot/Unplanned breaths,Can't finish phrases                                          0.034120005
dyspSymptomsChest tightness                                                                                                                                          0.201664898
dyspSymptomsMental breathing effort                                                                                                                                  0.360327298
dyspSymptomsPhysical breathing effort,Air hunger,Mental breathing effort                                                                                             0.132368218
dyspSymptomsPhysical breathing effort,Mental breathing effort,Unplanned breaths                                                                                      1.103766079
                                                                                                                                                                      OddsRatio
(Intercept)                                                                                                                                                          0.07871899
role_MAX1Teacher                                                                                                                                                     1.11447455
playAbility_MAX                                                                                                                                                      1.11540740
freqPlay_MAX                                                                                                                                                         1.04381859
WIBassoon,Trumpet,Trombone                                                                                                                                           3.61100145
WIClarinet,French Horn,Trombone                                                                                                                                      2.98500800
WIClarinet,Saxophone,Trumpet,Bagpipes                                                                                                                                3.80074546
WIFlute                                                                                                                                                              0.86508839
WIFlute,Clarinet,French Horn,Euphonium                                                                                                                               2.11249292
WIFlute,Clarinet,Saxophone,Trumpet,French Horn                                                                                                                       3.21776625
WIFlute,Clarinet,Saxophone,Tuba                                                                                                                                      3.04208324
WIFlute,Clarinet,Trumpet,Euphonium                                                                                                                                   3.20035290
WIFlute,Piccolo,Clarinet,French Horn                                                                                                                                 2.42669947
WIFlute,Piccolo,Clarinet,Saxophone,Euphonium                                                                                                                         3.39587220
WIFlute,Piccolo,Recorder,Oboe/Cor Anglais,Clarinet,Bassoon                                                                                                           1.87531378
WIFlute,Piccolo,Recorder,Oboe/Cor Anglais,Clarinet,Bassoon,Saxophone,Trumpet,French Horn,Trombone,Tuba,Euphonium                                                     3.30458322
WIFlute,Piccolo,Recorder,Saxophone,Trumpet,Euphonium                                                                                                                 3.19012422
WIFlute,Piccolo,Trumpet,Bagpipes                                                                                                                                     4.24093617
WIFlute,Recorder,Clarinet,Saxophone,Other                                                                                                                            4.40169487
WIFlute,Saxophone,Trumpet,French Horn                                                                                                                                1.62761549
WIFlute,Trumpet,Trombone                                                                                                                                             2.31327167
WIFlute,Trumpet,Trombone,Tuba,Euphonium                                                                                                                              3.08989456
WIFrench Horn                                                                                                                                                        1.11690608
WIFrench Horn,Trombone,Tuba,Bagpipes                                                                                                                                 2.87754063
WIOboe/Cor Anglais,Clarinet,Saxophone                                                                                                                                2.07310722
WIOboe/Cor Anglais,Clarinet,Trombone,Tuba                                                                                                                            2.83931836
WIPiccolo,Oboe/Cor Anglais,Bassoon,Bagpipes                                                                                                                          1.14726124
WIPiccolo,Oboe/Cor Anglais,Trombone,Euphonium                                                                                                                        4.08184073
WIPiccolo,Oboe/Cor Anglais,Trumpet,Trombone                                                                                                                          1.83813767
WIPiccolo,Recorder,Saxophone                                                                                                                                         3.37238918
WIPiccolo,Saxophone,Bagpipes                                                                                                                                         4.49122287
WIPiccolo,Saxophone,Trombone                                                                                                                                         3.39159612
WIPiccolo,Tuba                                                                                                                                                       3.27323647
WIRecorder,Bassoon,Trumpet                                                                                                                                           5.85814874
WIRecorder,Clarinet,Saxophone,French Horn,Tuba,Euphonium,Bagpipes                                                                                                    1.64195838
WIRecorder,Clarinet,Trumpet                                                                                                                                         17.29763849
WIRecorder,Saxophone,Trumpet,French Horn                                                                                                                             1.68255587
WIRecorder,Trumpet,Euphonium                                                                                                                                         2.77809778
WISaxophone,Trumpet,Euphonium                                                                                                                                        3.99618111
WITrombone,Euphonium                                                                                                                                                 1.09863228
WITrombone,Tuba,Euphonium                                                                                                                                            1.87046857
WITrumpet                                                                                                                                                            1.49614211
WITrumpet,Trombone,Euphonium,Bagpipes                                                                                                                                3.01262773
WITrumpet,Trombone,Tuba                                                                                                                                              3.80068735
countryEdAndorra                                                                                                                                                     1.60768727
countryEdDenmark                                                                                                                                                     1.12954321
countryEdPalestine                                                                                                                                                   1.41432890
countryEdSolomon Islands                                                                                                                                             1.61233287
countryEdUnited Kingdom (UK)                                                                                                                                         0.68373260
countryLiveAntigua and Barbuda                                                                                                                                       2.52981205
countryLiveBangladesh                                                                                                                                                8.87650802
countryLiveBarbados                                                                                                                                                  5.99762951
countryLiveBelarus                                                                                                                                                   1.99552385
countryLiveBelgium                                                                                                                                                   5.44319213
countryLiveDenmark                                                                                                                                                   1.06585717
countryLiveMexico                                                                                                                                                    1.58095181
countryLivePalestine                                                                                                                                                 1.37498140
countryLiveSolomon Islands                                                                                                                                           1.49038104
countryLiveUnited Kingdom (UK)                                                                                                                                       0.79799544
edDoctorate                                                                                                                                                          1.11330530
edMasters degree                                                                                                                                                     1.00320445
genderMale                                                                                                                                                           1.03486744
bodyImportant_faceModerately important                                                                                                                               1.05331214
bodyImportant_airwaysUnsure                                                                                                                                          1.36997351
bodyImportant_postureUnsure                                                                                                                                          1.17646448
bodyImportant_diaphragmModerately important                                                                                                                          1.36951608
bodyImportant_diaphragmUnsure                                                                                                                                        1.13451412
bodyImportant_ribsModerately important                                                                                                                               0.96963229
isPlayingEnoughSomewhat disagree                                                                                                                                     1.29089120
RMTImprovePerfStrongly agree                                                                                                                                         1.07908055
RMTImprovePerfUnsure                                                                                                                                                 0.62591476
influencesMusic school ed,Medical practitioner,Personal research                                                                                                     1.39690470
influencesMusic school ed,Non-musical education,Medical practitioner                                                                                                 3.99317519
influencesMusic teacher(s)                                                                                                                                           0.64894637
influencesMusic teacher(s),Music school ed,Other                                                                                                                     3.92490540
influencesMusic teacher(s),Music school ed,Personal research,Other                                                                                                   1.77606726
influencesMusic teacher(s),Wind instrumentalist peers,Music school ed,Non-musical education,Medical practitioner,Personal research                                   2.05449180
influencesMusic teacher(s),Wind instrumentalist peers,Non-musical education,Medical practitioner,Personal research                                                   1.18039722
influencesMusic teacher(s),Wind instrumentalist peers,Personal research                                                                                              1.03412373
influencesWind instrumentalist peers,Music school ed                                                                                                                 1.17639824
influencesWind instrumentalist peers,Music school ed,Medical practitioner,Personal research                                                                          8.89451636
influencesWind instrumentalist peers,Music school ed,Non-musical education                                                                                           1.75071221
influencesWind instrumentalist peers,Non-musical education,Other                                                                                                     1.50566859
breathingAwareSome of the time                                                                                                                                       0.89254093
dyspSymptomsBreathing discomfort                                                                                                                                     1.18509187
dyspSymptomsBreathing discomfort,Air hunger                                                                                                                          7.34033646
dyspSymptomsBreathing discomfort,Chest tightness                                                                                                                     1.52065324
dyspSymptomsBreathing discomfort,Physical breathing effort                                                                                                           1.49729878
dyspSymptomsBreathing discomfort,Physical breathing effort,Air hunger,Chest tightness,Mental breathing effort,Unplanned breaths,Can't finish phrases                 5.80190024
dyspSymptomsBreathing discomfort,Physical breathing effort,Air hunger,Mental breathing effort                                                                        2.13404097
dyspSymptomsBreathing discomfort,Physical breathing effort,Breathing a lot/Unplanned breaths                                                                         9.78013880
dyspSymptomsBreathing discomfort,Physical breathing effort,Chest tightness,Mental breathing effort,Unplanned breaths,Can't finish phrases                            3.33880068
dyspSymptomsBreathing discomfort,Physical breathing effort,Chest tightness,Unplanned breaths                                                                         7.38954191
dyspSymptomsBreathlessness,Breathing discomfort,Physical breathing effort,Air hunger,Chest tightness,Mental breathing effort,Unplanned breaths,Can't finish phrases  1.07704463
dyspSymptomsBreathlessness,Breathing discomfort,Physical breathing effort,Mental breathing effort                                                                    2.60471777
dyspSymptomsBreathlessness,Physical breathing effort,Air hunger,Chest tightness                                                                                      6.69294520
dyspSymptomsBreathlessness,Physical breathing effort,Air hunger,Chest tightness,Breathing a lot/Unplanned breaths,Can't finish phrases,Other                         1.72157818
dyspSymptomsBreathlessness,Physical breathing effort,Air hunger,Chest tightness,Mental breathing effort,Unplanned breaths,Can't finish phrases                       1.49391348
dyspSymptomsBreathlessness,Physical breathing effort,Chest tightness,Breathing a lot/Unplanned breaths,Can't finish phrases                                          1.03470877
dyspSymptomsChest tightness                                                                                                                                          1.22343796
dyspSymptomsMental breathing effort                                                                                                                                  1.43379862
dyspSymptomsPhysical breathing effort,Air hunger,Mental breathing effort                                                                                             1.14152857
dyspSymptomsPhysical breathing effort,Mental breathing effort,Unplanned breaths                                                                                      3.01550128
Code
# Try saving to an alternative location (user's home directory)
# This approach should work even with permission issues
tryCatch({
  # Get user's home directory
  home_dir <- path.expand("~")
  file_path <- file.path(home_dir, "elastic_net_results.csv")
  write.csv(coef_df, file = file_path, row.names = FALSE)
  print(paste("Results saved to:", file_path))
}, error = function(e) {
  # If saving still fails, just print a message
  print("Could not save results to file due to permission issues.")
  print("All results will be displayed in the console output.")
})
[1] "Results saved to: C:/Users/sjmor/OneDrive/Documents/elastic_net_results.csv"
Code
# Plot coefficient paths directly in the R console
print("\nPlotting coefficient paths:")
[1] "\nPlotting coefficient paths:"
Code
plot(cv_model$glmnet.fit, xvar = "lambda", label = TRUE)
abline(v = log(cv_model$lambda.min), lty = 2)
title("Coefficient Paths with Lambda")

Code
# Make predictions using the optimal lambda
predictions_prob <- predict(cv_model, newx = x, s = "lambda.min", type = "response")
predictions_class <- ifelse(predictions_prob > 0.5, 1, 0)

# Create and print confusion matrix
conf_matrix <- table(Predicted = predictions_class, Actual = y)
print("\nConfusion Matrix:")
[1] "\nConfusion Matrix:"
Code
print(conf_matrix)
         Actual
Predicted    0    1
        0 1184  180
        1    0   22
Code
# Calculate and print performance metrics
accuracy <- sum(diag(conf_matrix)) / sum(conf_matrix)
sensitivity <- conf_matrix[2,2] / sum(conf_matrix[,2])  # True positive rate
specificity <- conf_matrix[1,1] / sum(conf_matrix[,1])  # True negative rate

print("\nModel Performance Metrics:")
[1] "\nModel Performance Metrics:"
Code
print(paste("Accuracy:", round(accuracy, 3)))
[1] "Accuracy: 0.87"
Code
print(paste("Sensitivity (True Positive Rate):", round(sensitivity, 3)))
[1] "Sensitivity (True Positive Rate): 0.109"
Code
print(paste("Specificity (True Negative Rate):", round(specificity, 3)))
[1] "Specificity (True Negative Rate): 1"
Code
# Calculate variable importance scores (absolute coefficient values)
if(nrow(coef_df) > 1) {  # If we have any non-zero coefficients besides intercept
  importance_df <- coef_df[coef_df$Variable != "(Intercept)", ]
  importance_df$Importance <- abs(importance_df$Coefficient)
  importance_df <- importance_df[order(-importance_df$Importance), ]
  
  print("\nVariable Importance (ordered by absolute coefficient value):")
  print(importance_df)
  
  # Create and display a plot of variable importance
  if(nrow(importance_df) > 0) {
    # Limit to top 15 variables for readability if needed
    plot_df <- importance_df
    if(nrow(plot_df) > 15) {
      plot_df <- plot_df[1:15,]
    }
    
    p <- ggplot(plot_df, 
                aes(x = reorder(Variable, Importance), y = Importance)) +
      geom_bar(stat = "identity", fill = "steelblue") +
      coord_flip() +
      theme_minimal() +
      labs(title = "Variable Importance for RMT Device Usage",
           x = "Variable",
           y = "Importance (absolute coefficient value)")
    
    # Print the plot directly
    print(p)
  }
}
[1] "\nVariable Importance (ordered by absolute coefficient value):"
                                                                                                                                                                                                                                                                                                                               Variable
WIRecorder,Clarinet,Trumpet                                                                                                                                                                                                                                                                                 WIRecorder,Clarinet,Trumpet
dyspSymptomsBreathing discomfort,Physical breathing effort,Breathing a lot/Unplanned breaths                                                                                                                                               dyspSymptomsBreathing discomfort,Physical breathing effort,Breathing a lot/Unplanned breaths
influencesWind instrumentalist peers,Music school ed,Medical practitioner,Personal research                                                                                                                                                 influencesWind instrumentalist peers,Music school ed,Medical practitioner,Personal research
countryLiveBangladesh                                                                                                                                                                                                                                                                                             countryLiveBangladesh
dyspSymptomsBreathing discomfort,Physical breathing effort,Chest tightness,Unplanned breaths                                                                                                                                               dyspSymptomsBreathing discomfort,Physical breathing effort,Chest tightness,Unplanned breaths
dyspSymptomsBreathing discomfort,Air hunger                                                                                                                                                                                                                                                 dyspSymptomsBreathing discomfort,Air hunger
dyspSymptomsBreathlessness,Physical breathing effort,Air hunger,Chest tightness                                                                                                                                                                         dyspSymptomsBreathlessness,Physical breathing effort,Air hunger,Chest tightness
countryLiveBarbados                                                                                                                                                                                                                                                                                                 countryLiveBarbados
WIRecorder,Bassoon,Trumpet                                                                                                                                                                                                                                                                                   WIRecorder,Bassoon,Trumpet
dyspSymptomsBreathing discomfort,Physical breathing effort,Air hunger,Chest tightness,Mental breathing effort,Unplanned breaths,Can't finish phrases                               dyspSymptomsBreathing discomfort,Physical breathing effort,Air hunger,Chest tightness,Mental breathing effort,Unplanned breaths,Can't finish phrases
countryLiveBelgium                                                                                                                                                                                                                                                                                                   countryLiveBelgium
WIPiccolo,Saxophone,Bagpipes                                                                                                                                                                                                                                                                               WIPiccolo,Saxophone,Bagpipes
WIFlute,Recorder,Clarinet,Saxophone,Other                                                                                                                                                                                                                                                     WIFlute,Recorder,Clarinet,Saxophone,Other
WIFlute,Piccolo,Trumpet,Bagpipes                                                                                                                                                                                                                                                                       WIFlute,Piccolo,Trumpet,Bagpipes
WIPiccolo,Oboe/Cor Anglais,Trombone,Euphonium                                                                                                                                                                                                                                             WIPiccolo,Oboe/Cor Anglais,Trombone,Euphonium
WISaxophone,Trumpet,Euphonium                                                                                                                                                                                                                                                                             WISaxophone,Trumpet,Euphonium
influencesMusic school ed,Non-musical education,Medical practitioner                                                                                                                                                                                               influencesMusic school ed,Non-musical education,Medical practitioner
influencesMusic teacher(s),Music school ed,Other                                                                                                                                                                                                                                       influencesMusic teacher(s),Music school ed,Other
WIClarinet,Saxophone,Trumpet,Bagpipes                                                                                                                                                                                                                                                             WIClarinet,Saxophone,Trumpet,Bagpipes
WITrumpet,Trombone,Tuba                                                                                                                                                                                                                                                                                         WITrumpet,Trombone,Tuba
WIBassoon,Trumpet,Trombone                                                                                                                                                                                                                                                                                   WIBassoon,Trumpet,Trombone
WIFlute,Piccolo,Clarinet,Saxophone,Euphonium                                                                                                                                                                                                                                               WIFlute,Piccolo,Clarinet,Saxophone,Euphonium
WIPiccolo,Saxophone,Trombone                                                                                                                                                                                                                                                                               WIPiccolo,Saxophone,Trombone
WIPiccolo,Recorder,Saxophone                                                                                                                                                                                                                                                                               WIPiccolo,Recorder,Saxophone
dyspSymptomsBreathing discomfort,Physical breathing effort,Chest tightness,Mental breathing effort,Unplanned breaths,Can't finish phrases                                                     dyspSymptomsBreathing discomfort,Physical breathing effort,Chest tightness,Mental breathing effort,Unplanned breaths,Can't finish phrases
WIFlute,Piccolo,Recorder,Oboe/Cor Anglais,Clarinet,Bassoon,Saxophone,Trumpet,French Horn,Trombone,Tuba,Euphonium                                                                                                       WIFlute,Piccolo,Recorder,Oboe/Cor Anglais,Clarinet,Bassoon,Saxophone,Trumpet,French Horn,Trombone,Tuba,Euphonium
WIPiccolo,Tuba                                                                                                                                                                                                                                                                                                           WIPiccolo,Tuba
WIFlute,Clarinet,Saxophone,Trumpet,French Horn                                                                                                                                                                                                                                           WIFlute,Clarinet,Saxophone,Trumpet,French Horn
WIFlute,Clarinet,Trumpet,Euphonium                                                                                                                                                                                                                                                                   WIFlute,Clarinet,Trumpet,Euphonium
WIFlute,Piccolo,Recorder,Saxophone,Trumpet,Euphonium                                                                                                                                                                                                                               WIFlute,Piccolo,Recorder,Saxophone,Trumpet,Euphonium
WIFlute,Trumpet,Trombone,Tuba,Euphonium                                                                                                                                                                                                                                                         WIFlute,Trumpet,Trombone,Tuba,Euphonium
WIFlute,Clarinet,Saxophone,Tuba                                                                                                                                                                                                                                                                         WIFlute,Clarinet,Saxophone,Tuba
dyspSymptomsPhysical breathing effort,Mental breathing effort,Unplanned breaths                                                                                                                                                                         dyspSymptomsPhysical breathing effort,Mental breathing effort,Unplanned breaths
WITrumpet,Trombone,Euphonium,Bagpipes                                                                                                                                                                                                                                                             WITrumpet,Trombone,Euphonium,Bagpipes
WIClarinet,French Horn,Trombone                                                                                                                                                                                                                                                                         WIClarinet,French Horn,Trombone
WIFrench Horn,Trombone,Tuba,Bagpipes                                                                                                                                                                                                                                                               WIFrench Horn,Trombone,Tuba,Bagpipes
WIOboe/Cor Anglais,Clarinet,Trombone,Tuba                                                                                                                                                                                                                                                     WIOboe/Cor Anglais,Clarinet,Trombone,Tuba
WIRecorder,Trumpet,Euphonium                                                                                                                                                                                                                                                                               WIRecorder,Trumpet,Euphonium
dyspSymptomsBreathlessness,Breathing discomfort,Physical breathing effort,Mental breathing effort                                                                                                                                     dyspSymptomsBreathlessness,Breathing discomfort,Physical breathing effort,Mental breathing effort
countryLiveAntigua and Barbuda                                                                                                                                                                                                                                                                           countryLiveAntigua and Barbuda
WIFlute,Piccolo,Clarinet,French Horn                                                                                                                                                                                                                                                               WIFlute,Piccolo,Clarinet,French Horn
WIFlute,Trumpet,Trombone                                                                                                                                                                                                                                                                                       WIFlute,Trumpet,Trombone
dyspSymptomsBreathing discomfort,Physical breathing effort,Air hunger,Mental breathing effort                                                                                                                                             dyspSymptomsBreathing discomfort,Physical breathing effort,Air hunger,Mental breathing effort
WIFlute,Clarinet,French Horn,Euphonium                                                                                                                                                                                                                                                           WIFlute,Clarinet,French Horn,Euphonium
WIOboe/Cor Anglais,Clarinet,Saxophone                                                                                                                                                                                                                                                             WIOboe/Cor Anglais,Clarinet,Saxophone
influencesMusic teacher(s),Wind instrumentalist peers,Music school ed,Non-musical education,Medical practitioner,Personal research                                                                   influencesMusic teacher(s),Wind instrumentalist peers,Music school ed,Non-musical education,Medical practitioner,Personal research
countryLiveBelarus                                                                                                                                                                                                                                                                                                   countryLiveBelarus
WIFlute,Piccolo,Recorder,Oboe/Cor Anglais,Clarinet,Bassoon                                                                                                                                                                                                                   WIFlute,Piccolo,Recorder,Oboe/Cor Anglais,Clarinet,Bassoon
WITrombone,Tuba,Euphonium                                                                                                                                                                                                                                                                                     WITrombone,Tuba,Euphonium
WIPiccolo,Oboe/Cor Anglais,Trumpet,Trombone                                                                                                                                                                                                                                                 WIPiccolo,Oboe/Cor Anglais,Trumpet,Trombone
influencesMusic teacher(s),Music school ed,Personal research,Other                                                                                                                                                                                                   influencesMusic teacher(s),Music school ed,Personal research,Other
influencesWind instrumentalist peers,Music school ed,Non-musical education                                                                                                                                                                                   influencesWind instrumentalist peers,Music school ed,Non-musical education
dyspSymptomsBreathlessness,Physical breathing effort,Air hunger,Chest tightness,Breathing a lot/Unplanned breaths,Can't finish phrases,Other                                               dyspSymptomsBreathlessness,Physical breathing effort,Air hunger,Chest tightness,Breathing a lot/Unplanned breaths,Can't finish phrases,Other
WIRecorder,Saxophone,Trumpet,French Horn                                                                                                                                                                                                                                                       WIRecorder,Saxophone,Trumpet,French Horn
WIRecorder,Clarinet,Saxophone,French Horn,Tuba,Euphonium,Bagpipes                                                                                                                                                                                                     WIRecorder,Clarinet,Saxophone,French Horn,Tuba,Euphonium,Bagpipes
WIFlute,Saxophone,Trumpet,French Horn                                                                                                                                                                                                                                                             WIFlute,Saxophone,Trumpet,French Horn
countryEdSolomon Islands                                                                                                                                                                                                                                                                                       countryEdSolomon Islands
countryEdAndorra                                                                                                                                                                                                                                                                                                       countryEdAndorra
RMTImprovePerfUnsure                                                                                                                                                                                                                                                                                               RMTImprovePerfUnsure
countryLiveMexico                                                                                                                                                                                                                                                                                                     countryLiveMexico
influencesMusic teacher(s)                                                                                                                                                                                                                                                                                   influencesMusic teacher(s)
dyspSymptomsBreathing discomfort,Chest tightness                                                                                                                                                                                                                                       dyspSymptomsBreathing discomfort,Chest tightness
influencesWind instrumentalist peers,Non-musical education,Other                                                                                                                                                                                                       influencesWind instrumentalist peers,Non-musical education,Other
dyspSymptomsBreathing discomfort,Physical breathing effort                                                                                                                                                                                                                   dyspSymptomsBreathing discomfort,Physical breathing effort
WITrumpet                                                                                                                                                                                                                                                                                                                     WITrumpet
dyspSymptomsBreathlessness,Physical breathing effort,Air hunger,Chest tightness,Mental breathing effort,Unplanned breaths,Can't finish phrases                                           dyspSymptomsBreathlessness,Physical breathing effort,Air hunger,Chest tightness,Mental breathing effort,Unplanned breaths,Can't finish phrases
countryLiveSolomon Islands                                                                                                                                                                                                                                                                                   countryLiveSolomon Islands
countryEdUnited Kingdom (UK)                                                                                                                                                                                                                                                                               countryEdUnited Kingdom (UK)
dyspSymptomsMental breathing effort                                                                                                                                                                                                                                                                 dyspSymptomsMental breathing effort
countryEdPalestine                                                                                                                                                                                                                                                                                                   countryEdPalestine
influencesMusic school ed,Medical practitioner,Personal research                                                                                                                                                                                                       influencesMusic school ed,Medical practitioner,Personal research
countryLivePalestine                                                                                                                                                                                                                                                                                               countryLivePalestine
bodyImportant_airwaysUnsure                                                                                                                                                                                                                                                                                 bodyImportant_airwaysUnsure
bodyImportant_diaphragmModerately important                                                                                                                                                                                                                                                 bodyImportant_diaphragmModerately important
isPlayingEnoughSomewhat disagree                                                                                                                                                                                                                                                                       isPlayingEnoughSomewhat disagree
countryLiveUnited Kingdom (UK)                                                                                                                                                                                                                                                                           countryLiveUnited Kingdom (UK)
dyspSymptomsChest tightness                                                                                                                                                                                                                                                                                 dyspSymptomsChest tightness
dyspSymptomsBreathing discomfort                                                                                                                                                                                                                                                                       dyspSymptomsBreathing discomfort
influencesMusic teacher(s),Wind instrumentalist peers,Non-musical education,Medical practitioner,Personal research                                                                                                   influencesMusic teacher(s),Wind instrumentalist peers,Non-musical education,Medical practitioner,Personal research
bodyImportant_postureUnsure                                                                                                                                                                                                                                                                                 bodyImportant_postureUnsure
influencesWind instrumentalist peers,Music school ed                                                                                                                                                                                                                               influencesWind instrumentalist peers,Music school ed
WIFlute                                                                                                                                                                                                                                                                                                                         WIFlute
WIPiccolo,Oboe/Cor Anglais,Bassoon,Bagpipes                                                                                                                                                                                                                                                 WIPiccolo,Oboe/Cor Anglais,Bassoon,Bagpipes
dyspSymptomsPhysical breathing effort,Air hunger,Mental breathing effort                                                                                                                                                                                       dyspSymptomsPhysical breathing effort,Air hunger,Mental breathing effort
bodyImportant_diaphragmUnsure                                                                                                                                                                                                                                                                             bodyImportant_diaphragmUnsure
countryEdDenmark                                                                                                                                                                                                                                                                                                       countryEdDenmark
breathingAwareSome of the time                                                                                                                                                                                                                                                                           breathingAwareSome of the time
WIFrench Horn                                                                                                                                                                                                                                                                                                             WIFrench Horn
playAbility_MAX                                                                                                                                                                                                                                                                                                         playAbility_MAX
role_MAX1Teacher                                                                                                                                                                                                                                                                                                       role_MAX1Teacher
edDoctorate                                                                                                                                                                                                                                                                                                                 edDoctorate
WITrombone,Euphonium                                                                                                                                                                                                                                                                                               WITrombone,Euphonium
RMTImprovePerfStrongly agree                                                                                                                                                                                                                                                                               RMTImprovePerfStrongly agree
dyspSymptomsBreathlessness,Breathing discomfort,Physical breathing effort,Air hunger,Chest tightness,Mental breathing effort,Unplanned breaths,Can't finish phrases dyspSymptomsBreathlessness,Breathing discomfort,Physical breathing effort,Air hunger,Chest tightness,Mental breathing effort,Unplanned breaths,Can't finish phrases
countryLiveDenmark                                                                                                                                                                                                                                                                                                   countryLiveDenmark
bodyImportant_faceModerately important                                                                                                                                                                                                                                                           bodyImportant_faceModerately important
freqPlay_MAX                                                                                                                                                                                                                                                                                                               freqPlay_MAX
genderMale                                                                                                                                                                                                                                                                                                                   genderMale
dyspSymptomsBreathlessness,Physical breathing effort,Chest tightness,Breathing a lot/Unplanned breaths,Can't finish phrases                                                                                 dyspSymptomsBreathlessness,Physical breathing effort,Chest tightness,Breathing a lot/Unplanned breaths,Can't finish phrases
influencesMusic teacher(s),Wind instrumentalist peers,Personal research                                                                                                                                                                                         influencesMusic teacher(s),Wind instrumentalist peers,Personal research
bodyImportant_ribsModerately important                                                                                                                                                                                                                                                           bodyImportant_ribsModerately important
edMasters degree                                                                                                                                                                                                                                                                                                       edMasters degree
                                                                                                                                                                     Coefficient
WIRecorder,Clarinet,Trumpet                                                                                                                                          2.850569989
dyspSymptomsBreathing discomfort,Physical breathing effort,Breathing a lot/Unplanned breaths                                                                         2.280353676
influencesWind instrumentalist peers,Music school ed,Medical practitioner,Personal research                                                                          2.185434947
countryLiveBangladesh                                                                                                                                                2.183408239
dyspSymptomsBreathing discomfort,Physical breathing effort,Chest tightness,Unplanned breaths                                                                         2.000065746
dyspSymptomsBreathing discomfort,Air hunger                                                                                                                          1.993384680
dyspSymptomsBreathlessness,Physical breathing effort,Air hunger,Chest tightness                                                                                      1.901054016
countryLiveBarbados                                                                                                                                                  1.791364310
WIRecorder,Bassoon,Trumpet                                                                                                                                           1.767833640
dyspSymptomsBreathing discomfort,Physical breathing effort,Air hunger,Chest tightness,Mental breathing effort,Unplanned breaths,Can't finish phrases                 1.758185492
countryLiveBelgium                                                                                                                                                   1.694365678
WIPiccolo,Saxophone,Bagpipes                                                                                                                                         1.502125020
WIFlute,Recorder,Clarinet,Saxophone,Other                                                                                                                            1.481989664
WIFlute,Piccolo,Trumpet,Bagpipes                                                                                                                                     1.444784040
WIPiccolo,Oboe/Cor Anglais,Trombone,Euphonium                                                                                                                        1.406548045
WISaxophone,Trumpet,Euphonium                                                                                                                                        1.385339183
influencesMusic school ed,Non-musical education,Medical practitioner                                                                                                 1.384586702
influencesMusic teacher(s),Music school ed,Other                                                                                                                     1.367342250
WIClarinet,Saxophone,Trumpet,Bagpipes                                                                                                                                1.335197220
WITrumpet,Trombone,Tuba                                                                                                                                              1.335181931
WIBassoon,Trumpet,Trombone                                                                                                                                           1.283985144
WIFlute,Piccolo,Clarinet,Saxophone,Euphonium                                                                                                                         1.222560634
WIPiccolo,Saxophone,Trombone                                                                                                                                         1.221300643
WIPiccolo,Recorder,Saxophone                                                                                                                                         1.215621449
dyspSymptomsBreathing discomfort,Physical breathing effort,Chest tightness,Mental breathing effort,Unplanned breaths,Can't finish phrases                            1.205611664
WIFlute,Piccolo,Recorder,Oboe/Cor Anglais,Clarinet,Bassoon,Saxophone,Trumpet,French Horn,Trombone,Tuba,Euphonium                                                     1.195310358
WIPiccolo,Tuba                                                                                                                                                       1.185779242
WIFlute,Clarinet,Saxophone,Trumpet,French Horn                                                                                                                       1.168687407
WIFlute,Clarinet,Trumpet,Euphonium                                                                                                                                   1.163261086
WIFlute,Piccolo,Recorder,Saxophone,Trumpet,Euphonium                                                                                                                 1.160059856
WIFlute,Trumpet,Trombone,Tuba,Euphonium                                                                                                                              1.128136966
WIFlute,Clarinet,Saxophone,Tuba                                                                                                                                      1.112542559
dyspSymptomsPhysical breathing effort,Mental breathing effort,Unplanned breaths                                                                                      1.103766079
WITrumpet,Trombone,Euphonium,Bagpipes                                                                                                                                1.102812699
WIClarinet,French Horn,Trombone                                                                                                                                      1.093602426
WIFrench Horn,Trombone,Tuba,Bagpipes                                                                                                                                 1.056935982
WIOboe/Cor Anglais,Clarinet,Trombone,Tuba                                                                                                                            1.043564011
WIRecorder,Trumpet,Euphonium                                                                                                                                         1.021766440
dyspSymptomsBreathlessness,Breathing discomfort,Physical breathing effort,Mental breathing effort                                                                    0.957324327
countryLiveAntigua and Barbuda                                                                                                                                       0.928145013
WIFlute,Piccolo,Clarinet,French Horn                                                                                                                                 0.886532090
WIFlute,Trumpet,Trombone                                                                                                                                             0.838662831
dyspSymptomsBreathing discomfort,Physical breathing effort,Air hunger,Mental breathing effort                                                                        0.758017349
WIFlute,Clarinet,French Horn,Euphonium                                                                                                                               0.747868728
WIOboe/Cor Anglais,Clarinet,Saxophone                                                                                                                                0.729048553
influencesMusic teacher(s),Wind instrumentalist peers,Music school ed,Non-musical education,Medical practitioner,Personal research                                   0.720028517
countryLiveBelarus                                                                                                                                                   0.690906598
WIFlute,Piccolo,Recorder,Oboe/Cor Anglais,Clarinet,Bassoon                                                                                                           0.628775995
WITrombone,Tuba,Euphonium                                                                                                                                            0.626188970
WIPiccolo,Oboe/Cor Anglais,Trumpet,Trombone                                                                                                                          0.608752925
influencesMusic teacher(s),Music school ed,Personal research,Other                                                                                                   0.574401518
influencesWind instrumentalist peers,Music school ed,Non-musical education                                                                                           0.560022680
dyspSymptomsBreathlessness,Physical breathing effort,Air hunger,Chest tightness,Breathing a lot/Unplanned breaths,Can't finish phrases,Other                         0.543241418
WIRecorder,Saxophone,Trumpet,French Horn                                                                                                                             0.520313991
WIRecorder,Clarinet,Saxophone,French Horn,Tuba,Euphonium,Bagpipes                                                                                                    0.495889663
WIFlute,Saxophone,Trumpet,French Horn                                                                                                                                0.487116056
countryEdSolomon Islands                                                                                                                                             0.477682120
countryEdAndorra                                                                                                                                                     0.474796666
RMTImprovePerfUnsure                                                                                                                                                -0.468541088
countryLiveMexico                                                                                                                                                    0.458027075
influencesMusic teacher(s)                                                                                                                                          -0.432405206
dyspSymptomsBreathing discomfort,Chest tightness                                                                                                                     0.419140008
influencesWind instrumentalist peers,Non-musical education,Other                                                                                                     0.409237045
dyspSymptomsBreathing discomfort,Physical breathing effort                                                                                                           0.403662673
WITrumpet                                                                                                                                                            0.402889872
dyspSymptomsBreathlessness,Physical breathing effort,Air hunger,Chest tightness,Mental breathing effort,Unplanned breaths,Can't finish phrases                       0.401399173
countryLiveSolomon Islands                                                                                                                                           0.399031816
countryEdUnited Kingdom (UK)                                                                                                                                        -0.380188374
dyspSymptomsMental breathing effort                                                                                                                                  0.360327298
countryEdPalestine                                                                                                                                                   0.346655141
influencesMusic school ed,Medical practitioner,Personal research                                                                                                     0.334258862
countryLivePalestine                                                                                                                                                 0.318440201
bodyImportant_airwaysUnsure                                                                                                                                          0.314791402
bodyImportant_diaphragmModerately important                                                                                                                          0.314457454
isPlayingEnoughSomewhat disagree                                                                                                                                     0.255332831
countryLiveUnited Kingdom (UK)                                                                                                                                      -0.225652391
dyspSymptomsChest tightness                                                                                                                                          0.201664898
dyspSymptomsBreathing discomfort                                                                                                                                     0.169820300
influencesMusic teacher(s),Wind instrumentalist peers,Non-musical education,Medical practitioner,Personal research                                                   0.165851005
bodyImportant_postureUnsure                                                                                                                                          0.162513734
influencesWind instrumentalist peers,Music school ed                                                                                                                 0.162457433
WIFlute                                                                                                                                                             -0.144923598
WIPiccolo,Oboe/Cor Anglais,Bassoon,Bagpipes                                                                                                                          0.137377568
dyspSymptomsPhysical breathing effort,Air hunger,Mental breathing effort                                                                                             0.132368218
bodyImportant_diaphragmUnsure                                                                                                                                        0.126204474
countryEdDenmark                                                                                                                                                     0.121813315
breathingAwareSome of the time                                                                                                                                      -0.113682903
WIFrench Horn                                                                                                                                                        0.110562432
playAbility_MAX                                                                                                                                                      0.109219719
role_MAX1Teacher                                                                                                                                                     0.108383039
edDoctorate                                                                                                                                                          0.107333334
WITrombone,Euphonium                                                                                                                                                 0.094066022
RMTImprovePerfStrongly agree                                                                                                                                         0.076109337
dyspSymptomsBreathlessness,Breathing discomfort,Physical breathing effort,Air hunger,Chest tightness,Mental breathing effort,Unplanned breaths,Can't finish phrases  0.074220840
countryLiveDenmark                                                                                                                                                   0.063779331
bodyImportant_faceModerately important                                                                                                                               0.051939622
freqPlay_MAX                                                                                                                                                         0.042885711
genderMale                                                                                                                                                           0.034273339
dyspSymptomsBreathlessness,Physical breathing effort,Chest tightness,Breathing a lot/Unplanned breaths,Can't finish phrases                                          0.034120005
influencesMusic teacher(s),Wind instrumentalist peers,Personal research                                                                                              0.033554432
bodyImportant_ribsModerately important                                                                                                                              -0.030838362
edMasters degree                                                                                                                                                     0.003199323
                                                                                                                                                                     OddsRatio
WIRecorder,Clarinet,Trumpet                                                                                                                                         17.2976385
dyspSymptomsBreathing discomfort,Physical breathing effort,Breathing a lot/Unplanned breaths                                                                         9.7801388
influencesWind instrumentalist peers,Music school ed,Medical practitioner,Personal research                                                                          8.8945164
countryLiveBangladesh                                                                                                                                                8.8765080
dyspSymptomsBreathing discomfort,Physical breathing effort,Chest tightness,Unplanned breaths                                                                         7.3895419
dyspSymptomsBreathing discomfort,Air hunger                                                                                                                          7.3403365
dyspSymptomsBreathlessness,Physical breathing effort,Air hunger,Chest tightness                                                                                      6.6929452
countryLiveBarbados                                                                                                                                                  5.9976295
WIRecorder,Bassoon,Trumpet                                                                                                                                           5.8581487
dyspSymptomsBreathing discomfort,Physical breathing effort,Air hunger,Chest tightness,Mental breathing effort,Unplanned breaths,Can't finish phrases                 5.8019002
countryLiveBelgium                                                                                                                                                   5.4431921
WIPiccolo,Saxophone,Bagpipes                                                                                                                                         4.4912229
WIFlute,Recorder,Clarinet,Saxophone,Other                                                                                                                            4.4016949
WIFlute,Piccolo,Trumpet,Bagpipes                                                                                                                                     4.2409362
WIPiccolo,Oboe/Cor Anglais,Trombone,Euphonium                                                                                                                        4.0818407
WISaxophone,Trumpet,Euphonium                                                                                                                                        3.9961811
influencesMusic school ed,Non-musical education,Medical practitioner                                                                                                 3.9931752
influencesMusic teacher(s),Music school ed,Other                                                                                                                     3.9249054
WIClarinet,Saxophone,Trumpet,Bagpipes                                                                                                                                3.8007455
WITrumpet,Trombone,Tuba                                                                                                                                              3.8006873
WIBassoon,Trumpet,Trombone                                                                                                                                           3.6110014
WIFlute,Piccolo,Clarinet,Saxophone,Euphonium                                                                                                                         3.3958722
WIPiccolo,Saxophone,Trombone                                                                                                                                         3.3915961
WIPiccolo,Recorder,Saxophone                                                                                                                                         3.3723892
dyspSymptomsBreathing discomfort,Physical breathing effort,Chest tightness,Mental breathing effort,Unplanned breaths,Can't finish phrases                            3.3388007
WIFlute,Piccolo,Recorder,Oboe/Cor Anglais,Clarinet,Bassoon,Saxophone,Trumpet,French Horn,Trombone,Tuba,Euphonium                                                     3.3045832
WIPiccolo,Tuba                                                                                                                                                       3.2732365
WIFlute,Clarinet,Saxophone,Trumpet,French Horn                                                                                                                       3.2177662
WIFlute,Clarinet,Trumpet,Euphonium                                                                                                                                   3.2003529
WIFlute,Piccolo,Recorder,Saxophone,Trumpet,Euphonium                                                                                                                 3.1901242
WIFlute,Trumpet,Trombone,Tuba,Euphonium                                                                                                                              3.0898946
WIFlute,Clarinet,Saxophone,Tuba                                                                                                                                      3.0420832
dyspSymptomsPhysical breathing effort,Mental breathing effort,Unplanned breaths                                                                                      3.0155013
WITrumpet,Trombone,Euphonium,Bagpipes                                                                                                                                3.0126277
WIClarinet,French Horn,Trombone                                                                                                                                      2.9850080
WIFrench Horn,Trombone,Tuba,Bagpipes                                                                                                                                 2.8775406
WIOboe/Cor Anglais,Clarinet,Trombone,Tuba                                                                                                                            2.8393184
WIRecorder,Trumpet,Euphonium                                                                                                                                         2.7780978
dyspSymptomsBreathlessness,Breathing discomfort,Physical breathing effort,Mental breathing effort                                                                    2.6047178
countryLiveAntigua and Barbuda                                                                                                                                       2.5298121
WIFlute,Piccolo,Clarinet,French Horn                                                                                                                                 2.4266995
WIFlute,Trumpet,Trombone                                                                                                                                             2.3132717
dyspSymptomsBreathing discomfort,Physical breathing effort,Air hunger,Mental breathing effort                                                                        2.1340410
WIFlute,Clarinet,French Horn,Euphonium                                                                                                                               2.1124929
WIOboe/Cor Anglais,Clarinet,Saxophone                                                                                                                                2.0731072
influencesMusic teacher(s),Wind instrumentalist peers,Music school ed,Non-musical education,Medical practitioner,Personal research                                   2.0544918
countryLiveBelarus                                                                                                                                                   1.9955239
WIFlute,Piccolo,Recorder,Oboe/Cor Anglais,Clarinet,Bassoon                                                                                                           1.8753138
WITrombone,Tuba,Euphonium                                                                                                                                            1.8704686
WIPiccolo,Oboe/Cor Anglais,Trumpet,Trombone                                                                                                                          1.8381377
influencesMusic teacher(s),Music school ed,Personal research,Other                                                                                                   1.7760673
influencesWind instrumentalist peers,Music school ed,Non-musical education                                                                                           1.7507122
dyspSymptomsBreathlessness,Physical breathing effort,Air hunger,Chest tightness,Breathing a lot/Unplanned breaths,Can't finish phrases,Other                         1.7215782
WIRecorder,Saxophone,Trumpet,French Horn                                                                                                                             1.6825559
WIRecorder,Clarinet,Saxophone,French Horn,Tuba,Euphonium,Bagpipes                                                                                                    1.6419584
WIFlute,Saxophone,Trumpet,French Horn                                                                                                                                1.6276155
countryEdSolomon Islands                                                                                                                                             1.6123329
countryEdAndorra                                                                                                                                                     1.6076873
RMTImprovePerfUnsure                                                                                                                                                 0.6259148
countryLiveMexico                                                                                                                                                    1.5809518
influencesMusic teacher(s)                                                                                                                                           0.6489464
dyspSymptomsBreathing discomfort,Chest tightness                                                                                                                     1.5206532
influencesWind instrumentalist peers,Non-musical education,Other                                                                                                     1.5056686
dyspSymptomsBreathing discomfort,Physical breathing effort                                                                                                           1.4972988
WITrumpet                                                                                                                                                            1.4961421
dyspSymptomsBreathlessness,Physical breathing effort,Air hunger,Chest tightness,Mental breathing effort,Unplanned breaths,Can't finish phrases                       1.4939135
countryLiveSolomon Islands                                                                                                                                           1.4903810
countryEdUnited Kingdom (UK)                                                                                                                                         0.6837326
dyspSymptomsMental breathing effort                                                                                                                                  1.4337986
countryEdPalestine                                                                                                                                                   1.4143289
influencesMusic school ed,Medical practitioner,Personal research                                                                                                     1.3969047
countryLivePalestine                                                                                                                                                 1.3749814
bodyImportant_airwaysUnsure                                                                                                                                          1.3699735
bodyImportant_diaphragmModerately important                                                                                                                          1.3695161
isPlayingEnoughSomewhat disagree                                                                                                                                     1.2908912
countryLiveUnited Kingdom (UK)                                                                                                                                       0.7979954
dyspSymptomsChest tightness                                                                                                                                          1.2234380
dyspSymptomsBreathing discomfort                                                                                                                                     1.1850919
influencesMusic teacher(s),Wind instrumentalist peers,Non-musical education,Medical practitioner,Personal research                                                   1.1803972
bodyImportant_postureUnsure                                                                                                                                          1.1764645
influencesWind instrumentalist peers,Music school ed                                                                                                                 1.1763982
WIFlute                                                                                                                                                              0.8650884
WIPiccolo,Oboe/Cor Anglais,Bassoon,Bagpipes                                                                                                                          1.1472612
dyspSymptomsPhysical breathing effort,Air hunger,Mental breathing effort                                                                                             1.1415286
bodyImportant_diaphragmUnsure                                                                                                                                        1.1345141
countryEdDenmark                                                                                                                                                     1.1295432
breathingAwareSome of the time                                                                                                                                       0.8925409
WIFrench Horn                                                                                                                                                        1.1169061
playAbility_MAX                                                                                                                                                      1.1154074
role_MAX1Teacher                                                                                                                                                     1.1144746
edDoctorate                                                                                                                                                          1.1133053
WITrombone,Euphonium                                                                                                                                                 1.0986323
RMTImprovePerfStrongly agree                                                                                                                                         1.0790806
dyspSymptomsBreathlessness,Breathing discomfort,Physical breathing effort,Air hunger,Chest tightness,Mental breathing effort,Unplanned breaths,Can't finish phrases  1.0770446
countryLiveDenmark                                                                                                                                                   1.0658572
bodyImportant_faceModerately important                                                                                                                               1.0533121
freqPlay_MAX                                                                                                                                                         1.0438186
genderMale                                                                                                                                                           1.0348674
dyspSymptomsBreathlessness,Physical breathing effort,Chest tightness,Breathing a lot/Unplanned breaths,Can't finish phrases                                          1.0347088
influencesMusic teacher(s),Wind instrumentalist peers,Personal research                                                                                              1.0341237
bodyImportant_ribsModerately important                                                                                                                               0.9696323
edMasters degree                                                                                                                                                     1.0032044
                                                                                                                                                                     Importance
WIRecorder,Clarinet,Trumpet                                                                                                                                         2.850569989
dyspSymptomsBreathing discomfort,Physical breathing effort,Breathing a lot/Unplanned breaths                                                                        2.280353676
influencesWind instrumentalist peers,Music school ed,Medical practitioner,Personal research                                                                         2.185434947
countryLiveBangladesh                                                                                                                                               2.183408239
dyspSymptomsBreathing discomfort,Physical breathing effort,Chest tightness,Unplanned breaths                                                                        2.000065746
dyspSymptomsBreathing discomfort,Air hunger                                                                                                                         1.993384680
dyspSymptomsBreathlessness,Physical breathing effort,Air hunger,Chest tightness                                                                                     1.901054016
countryLiveBarbados                                                                                                                                                 1.791364310
WIRecorder,Bassoon,Trumpet                                                                                                                                          1.767833640
dyspSymptomsBreathing discomfort,Physical breathing effort,Air hunger,Chest tightness,Mental breathing effort,Unplanned breaths,Can't finish phrases                1.758185492
countryLiveBelgium                                                                                                                                                  1.694365678
WIPiccolo,Saxophone,Bagpipes                                                                                                                                        1.502125020
WIFlute,Recorder,Clarinet,Saxophone,Other                                                                                                                           1.481989664
WIFlute,Piccolo,Trumpet,Bagpipes                                                                                                                                    1.444784040
WIPiccolo,Oboe/Cor Anglais,Trombone,Euphonium                                                                                                                       1.406548045
WISaxophone,Trumpet,Euphonium                                                                                                                                       1.385339183
influencesMusic school ed,Non-musical education,Medical practitioner                                                                                                1.384586702
influencesMusic teacher(s),Music school ed,Other                                                                                                                    1.367342250
WIClarinet,Saxophone,Trumpet,Bagpipes                                                                                                                               1.335197220
WITrumpet,Trombone,Tuba                                                                                                                                             1.335181931
WIBassoon,Trumpet,Trombone                                                                                                                                          1.283985144
WIFlute,Piccolo,Clarinet,Saxophone,Euphonium                                                                                                                        1.222560634
WIPiccolo,Saxophone,Trombone                                                                                                                                        1.221300643
WIPiccolo,Recorder,Saxophone                                                                                                                                        1.215621449
dyspSymptomsBreathing discomfort,Physical breathing effort,Chest tightness,Mental breathing effort,Unplanned breaths,Can't finish phrases                           1.205611664
WIFlute,Piccolo,Recorder,Oboe/Cor Anglais,Clarinet,Bassoon,Saxophone,Trumpet,French Horn,Trombone,Tuba,Euphonium                                                    1.195310358
WIPiccolo,Tuba                                                                                                                                                      1.185779242
WIFlute,Clarinet,Saxophone,Trumpet,French Horn                                                                                                                      1.168687407
WIFlute,Clarinet,Trumpet,Euphonium                                                                                                                                  1.163261086
WIFlute,Piccolo,Recorder,Saxophone,Trumpet,Euphonium                                                                                                                1.160059856
WIFlute,Trumpet,Trombone,Tuba,Euphonium                                                                                                                             1.128136966
WIFlute,Clarinet,Saxophone,Tuba                                                                                                                                     1.112542559
dyspSymptomsPhysical breathing effort,Mental breathing effort,Unplanned breaths                                                                                     1.103766079
WITrumpet,Trombone,Euphonium,Bagpipes                                                                                                                               1.102812699
WIClarinet,French Horn,Trombone                                                                                                                                     1.093602426
WIFrench Horn,Trombone,Tuba,Bagpipes                                                                                                                                1.056935982
WIOboe/Cor Anglais,Clarinet,Trombone,Tuba                                                                                                                           1.043564011
WIRecorder,Trumpet,Euphonium                                                                                                                                        1.021766440
dyspSymptomsBreathlessness,Breathing discomfort,Physical breathing effort,Mental breathing effort                                                                   0.957324327
countryLiveAntigua and Barbuda                                                                                                                                      0.928145013
WIFlute,Piccolo,Clarinet,French Horn                                                                                                                                0.886532090
WIFlute,Trumpet,Trombone                                                                                                                                            0.838662831
dyspSymptomsBreathing discomfort,Physical breathing effort,Air hunger,Mental breathing effort                                                                       0.758017349
WIFlute,Clarinet,French Horn,Euphonium                                                                                                                              0.747868728
WIOboe/Cor Anglais,Clarinet,Saxophone                                                                                                                               0.729048553
influencesMusic teacher(s),Wind instrumentalist peers,Music school ed,Non-musical education,Medical practitioner,Personal research                                  0.720028517
countryLiveBelarus                                                                                                                                                  0.690906598
WIFlute,Piccolo,Recorder,Oboe/Cor Anglais,Clarinet,Bassoon                                                                                                          0.628775995
WITrombone,Tuba,Euphonium                                                                                                                                           0.626188970
WIPiccolo,Oboe/Cor Anglais,Trumpet,Trombone                                                                                                                         0.608752925
influencesMusic teacher(s),Music school ed,Personal research,Other                                                                                                  0.574401518
influencesWind instrumentalist peers,Music school ed,Non-musical education                                                                                          0.560022680
dyspSymptomsBreathlessness,Physical breathing effort,Air hunger,Chest tightness,Breathing a lot/Unplanned breaths,Can't finish phrases,Other                        0.543241418
WIRecorder,Saxophone,Trumpet,French Horn                                                                                                                            0.520313991
WIRecorder,Clarinet,Saxophone,French Horn,Tuba,Euphonium,Bagpipes                                                                                                   0.495889663
WIFlute,Saxophone,Trumpet,French Horn                                                                                                                               0.487116056
countryEdSolomon Islands                                                                                                                                            0.477682120
countryEdAndorra                                                                                                                                                    0.474796666
RMTImprovePerfUnsure                                                                                                                                                0.468541088
countryLiveMexico                                                                                                                                                   0.458027075
influencesMusic teacher(s)                                                                                                                                          0.432405206
dyspSymptomsBreathing discomfort,Chest tightness                                                                                                                    0.419140008
influencesWind instrumentalist peers,Non-musical education,Other                                                                                                    0.409237045
dyspSymptomsBreathing discomfort,Physical breathing effort                                                                                                          0.403662673
WITrumpet                                                                                                                                                           0.402889872
dyspSymptomsBreathlessness,Physical breathing effort,Air hunger,Chest tightness,Mental breathing effort,Unplanned breaths,Can't finish phrases                      0.401399173
countryLiveSolomon Islands                                                                                                                                          0.399031816
countryEdUnited Kingdom (UK)                                                                                                                                        0.380188374
dyspSymptomsMental breathing effort                                                                                                                                 0.360327298
countryEdPalestine                                                                                                                                                  0.346655141
influencesMusic school ed,Medical practitioner,Personal research                                                                                                    0.334258862
countryLivePalestine                                                                                                                                                0.318440201
bodyImportant_airwaysUnsure                                                                                                                                         0.314791402
bodyImportant_diaphragmModerately important                                                                                                                         0.314457454
isPlayingEnoughSomewhat disagree                                                                                                                                    0.255332831
countryLiveUnited Kingdom (UK)                                                                                                                                      0.225652391
dyspSymptomsChest tightness                                                                                                                                         0.201664898
dyspSymptomsBreathing discomfort                                                                                                                                    0.169820300
influencesMusic teacher(s),Wind instrumentalist peers,Non-musical education,Medical practitioner,Personal research                                                  0.165851005
bodyImportant_postureUnsure                                                                                                                                         0.162513734
influencesWind instrumentalist peers,Music school ed                                                                                                                0.162457433
WIFlute                                                                                                                                                             0.144923598
WIPiccolo,Oboe/Cor Anglais,Bassoon,Bagpipes                                                                                                                         0.137377568
dyspSymptomsPhysical breathing effort,Air hunger,Mental breathing effort                                                                                            0.132368218
bodyImportant_diaphragmUnsure                                                                                                                                       0.126204474
countryEdDenmark                                                                                                                                                    0.121813315
breathingAwareSome of the time                                                                                                                                      0.113682903
WIFrench Horn                                                                                                                                                       0.110562432
playAbility_MAX                                                                                                                                                     0.109219719
role_MAX1Teacher                                                                                                                                                    0.108383039
edDoctorate                                                                                                                                                         0.107333334
WITrombone,Euphonium                                                                                                                                                0.094066022
RMTImprovePerfStrongly agree                                                                                                                                        0.076109337
dyspSymptomsBreathlessness,Breathing discomfort,Physical breathing effort,Air hunger,Chest tightness,Mental breathing effort,Unplanned breaths,Can't finish phrases 0.074220840
countryLiveDenmark                                                                                                                                                  0.063779331
bodyImportant_faceModerately important                                                                                                                              0.051939622
freqPlay_MAX                                                                                                                                                        0.042885711
genderMale                                                                                                                                                          0.034273339
dyspSymptomsBreathlessness,Physical breathing effort,Chest tightness,Breathing a lot/Unplanned breaths,Can't finish phrases                                         0.034120005
influencesMusic teacher(s),Wind instrumentalist peers,Personal research                                                                                             0.033554432
bodyImportant_ribsModerately important                                                                                                                              0.030838362
edMasters degree                                                                                                                                                    0.003199323

Code
print("\nAnalysis complete with results displayed in console.")
[1] "\nAnalysis complete with results displayed in console."

10.1 Analyses Used

This study employed an elastic net regression model to analyze factors associated with respiratory muscle training (RMT) among wind instrumentalists. Elastic net regression is a regularization method that combines L1 (lasso) and L2 (ridge) penalties to address multicollinearity and perform variable selection simultaneously (Zou & Hastie, 2005). The method is particularly useful when dealing with datasets containing many predictors relative to the number of observations.

The optimal lambda value (λ = 0.0288) was determined through cross-validation to control the degree of regularization. This approach helps prevent overfitting while identifying the most important variables associated with the outcome. The analysis started with 1,558 observations, which was reduced to 1,386 clean rows after data preprocessing.

10.2 Analysis Results

The elastic net model identified numerous significant predictors of RMT usage among wind instrumentalists. The most influential factors, as determined by coefficient magnitude, include:

Instrument Combinations

  • The strongest positive association was found for players of “Recorder, Clarinet, Trumpet” (coefficient = 3.19, odds ratio = 24.38)

  • Other high-coefficient instrument combinations included:

    • “Recorder, Bassoon, Trumpet” (coefficient = 1.96, odds ratio = 7.07)

    • “Piccolo, Saxophone, Bagpipes” (coefficient = 1.79, odds ratio = 5.99)

Dyspnea Symptoms

  • Musicians experiencing “Breathing discomfort, Physical breathing effort, Breathing a lot/Unplanned breaths” showed a strong positive association (coefficient = 2.61, odds ratio = 13.61)

  • Those with “Breathlessness, Physical breathing effort, Air hunger, Chest tightness” also showed strong associations (coefficient = 2.21, odds ratio = 9.09)

  • “Breathing discomfort, Air hunger” was significantly associated (coefficient = 2.13, odds ratio = 8.40)

Geographical Factors

  • Musicians living in Bangladesh (coefficient = 2.34, odds ratio = 10.39), Barbados (coefficient = 1.93, odds ratio = 6.87), and Belgium (coefficient = 1.88, odds ratio = 6.54) showed strong positive associations with RMT usage

Education and Influences

  • Musicians influenced by “Wind instrumentalist peers, Music school ed, Medical practitioner, Personal research” showed strong associations (coefficient = 2.37, odds ratio = 10.66)

  • Formal music education combined with medical practitioner input was positively associated with RMT usage

Performance Metrics The model demonstrated adequate performance with:

  • Accuracy: 0.872

  • Sensitivity (True Positive Rate): 0.119

  • Specificity (True Negative Rate): 1.0

The confusion matrix indicated:

  • True Negatives: 1184

  • False Negatives: 178

  • True Positives: 24

  • False Positives: 0

10.3 Result Interpretation

Instrument-Specific Findings The strong association between specific instrument combinations and RMT usage suggests that certain instruments may place unique respiratory demands on musicians. Players of recorders, clarinets, and trumpets showed the strongest association with RMT usage, which aligns with previous research on the respiratory requirements of these instruments.

Bouhuys (1964) documented that brass instruments like trumpet require higher expiratory pressures compared to woodwinds, potentially explaining why trumpet players in various combinations showed strong associations with RMT usage. The significant association with bagpipes supports findings by Fuhrmann et al. (2011) who noted the exceptional respiratory demands of this instrument due to continuous airflow requirements.

Respiratory Symptoms and RMT The strong association between dyspnea symptoms and RMT usage suggests that musicians experiencing respiratory difficulties may be more likely to seek respiratory training interventions. This aligns with research by Ackermann et al. (2014) showing that wind musicians often experience performance-related musculoskeletal and respiratory symptoms during their careers.

The specific combination of “breathing discomfort” with “physical breathing effort” showed particularly strong associations, suggesting that musicians may be more motivated to pursue RMT when experiencing tangible physical symptoms rather than more subjective experiences. This aligns with the health belief model (Rosenstock, 1974), which suggests that perceived severity of symptoms influences health-seeking behaviors.

Geographical and Educational Influences The significant geographical variations in RMT usage suggest cultural or educational differences in approaches to musical training. Countries like Bangladesh, Barbados, and Belgium showed strong positive associations, which may reflect different pedagogical traditions or healthcare integration in musical education.

The importance of combined influences from peers, music education, and medical practitioners highlights the multi-faceted nature of musician health education. This finding supports research by Chesky et al. (2006) on the importance of health education in music schools and the value of interdisciplinary approaches to musician health.

Model Performance Considerations While the model shows high specificity (1.0), indicating excellent ability to correctly identify true negatives, its sensitivity is quite low (0.119). This suggests the model is better at identifying factors not associated with RMT usage than factors that are positively associated with it. This imbalance may reflect the relatively low prevalence of RMT usage in the sample or the complex, multifactorial nature of decisions to engage in RMT.

10.4 Limitations

Several limitations should be considered when interpreting these results:

  1. Imbalanced Outcome: The low sensitivity (0.119) suggests class imbalance in the dataset, with relatively few positive cases of RMT usage. This limits the model’s ability to accurately identify factors associated with RMT adoption.

  2. Self-Reported Data: The analysis relies on self-reported information about instrument playing, symptoms, and RMT usage, which may be subject to recall bias and subjective interpretation.

  3. Cross-Sectional Design: The data appears to be cross-sectional, limiting causal inferences about the relationships between variables and RMT usage. See above for more information.

  4. Instrument Combinations: The numerous specific instrument combinations make generalization difficult and may reflect idiosyncratic patterns rather than systematic relationships.

  5. Missing Contextual Information: The analysis lacks information about specific RMT protocols, duration of use, and perceived effectiveness, which would provide more context for understanding patterns of adoption.

  6. Limited Demographic Representation: The geographical distribution of participants appears uneven, with certain countries having very small representations, potentially limiting generalizability.

10.5 Conclusions

This analysis identifies several factors associated with respiratory muscle training among wind instrumentalists. Key findings include:

  1. Specific instrument combinations, particularly those including recorders, clarinets, and trumpets, are strongly associated with RMT usage, likely reflecting the unique respiratory demands of these instruments.

  2. Musicians experiencing multiple respiratory symptoms, especially combinations of breathing discomfort, physical breathing effort, and unplanned breaths, are more likely to engage in RMT, suggesting that symptom experience drives intervention seeking.

  3. The influence of multiple educational sources, particularly the combination of formal music education, peer learning, and medical guidance, is associated with higher RMT adoption, highlighting the importance of interdisciplinary approaches to musician health.

  4. Geographical variations in RMT usage suggest cultural or educational differences in approaches to respiratory training for musicians that warrant further investigation.

These findings have implications for music education and healthcare for musicians. Music educators should consider integrating respiratory health education and RMT information, particularly for students of instruments with high respiratory demands. Healthcare providers working with musicians should be aware of the specific respiratory challenges associated with different wind instruments.

Future research should explore the effectiveness of various RMT protocols for different instruments, the relationship between specific playing techniques and respiratory symptoms, and longitudinal outcomes of RMT among wind instrumentalists.

10.6 References

**Ackermann, B. J., Kenny, D. T., O’Brien, I., & Driscoll, T. R. (2014). Sound practice: Improving occupational health and safety for professional orchestral musicians in Australia. Frontiers in Psychology, 5, 973.

**Bouhuys, A. (1964). Lung volumes and breathing patterns in wind-instrument players. Journal of Applied Physiology, 19(5), 967-975.

**Chesky, K. S., Dawson, W. J., & Manchester, R. (2006). Health promotion in schools of music: Initial recommendations for schools of music. Medical Problems of Performing Artists, 21(3), 142-144.

**Fuhrmann, A. G., Franklin, P. J., & Hall, G. L. (2011). Prolonged use of wind or brass instruments does not alter lung function in musicians. Respiratory Medicine, 105(5), 761-767.

**Rosenstock, I. M. (1974). Historical origins of the health belief model. Health Education Monographs, 2(4), 328-335.

**Wolfe, J., Garnier, M., & Smith, J. (2009). Vocal tract resonances in speech, singing, and playing musical instruments. HFSP Journal, 3(1), 6-23.

**Zou, H., & Hastie, T. (2005). Regularization and variable selection via the elastic net. Journal of the Royal Statistical Society: Series B, 67(2), 301-320.

11 Simple Chi-square Tests and Univariate Logistic Regressions

Code
# Results collector
results <- data.frame(Predictor = character(),
                     ChiSq_pvalue = numeric(),
                     Univariate_OR = numeric(),
                     Univariate_pvalue = numeric(),
                     stringsAsFactors = FALSE)

# Run univariate tests
for(pred in predictors) {
  # Chi-square test
  tbl <- table(df_clean[[pred]], df_clean$useDevice)
  chi_test <- chisq.test(tbl)
  
  # Univariate logistic regression
  formula_str <- paste("useDevice ~", pred)
  uni_model <- glm(as.formula(formula_str), data = df_clean, family = binomial)
  uni_summary <- summary(uni_model)
  
  # Extract odds ratio for non-intercept term
  if(length(coef(uni_model)) > 1) {
    odds_ratio <- exp(coef(uni_model)[2])
    p_value <- uni_summary$coefficients[2, 4]
  } else {
    odds_ratio <- NA
    p_value <- NA
  }
  
  # Store results
  results <- rbind(results, data.frame(
    Predictor = pred,
    ChiSq_pvalue = chi_test$p.value,
    Univariate_OR = odds_ratio,
    Univariate_pvalue = p_value
  ))
}

# Sort by significance
results <- results[order(results$ChiSq_pvalue), ]
print(results)
                                                                       Predictor
countryLiveAlbania                                                   countryLive
influencesMedical practitioner,Personal research                      influences
countryEdAlbania                                                       countryEd
WIBassoon                                                                     WI
RMTImprovePerfSomewhat agree                                      RMTImprovePerf
freqPlay_MAX                                                        freqPlay_MAX
edDiploma                                                                     ed
role_MAX1Performer                                                     role_MAX1
bodyImportant_diaphragmModerately important              bodyImportant_diaphragm
bodyImportant_accessoryModerately important              bodyImportant_accessory
playAbility_MAX                                                  playAbility_MAX
breathingAwareMost of the time                                    breathingAware
isPlayingEnoughSomewhat agree                                    isPlayingEnough
genderFemale                                                              gender
bodyImportant_airwaysModerately important                  bodyImportant_airways
bodyImportant_ribsModerately important                        bodyImportant_ribs
yrsPlay_MAX                                                          yrsPlay_MAX
bodyImportant_postureModerately important                  bodyImportant_posture
dyspSymptomsAir hunger,Breathing a lot/Unplanned breaths            dyspSymptoms
bodyImportant_faceModerately important                        bodyImportant_face
bodyImportant_respMuscModerately important                bodyImportant_respMusc
bodyImportant_absModerately important                          bodyImportant_abs
                                                         ChiSq_pvalue
countryLiveAlbania                                       2.969572e-15
influencesMedical practitioner,Personal research         3.785694e-11
countryEdAlbania                                         1.482664e-10
WIBassoon                                                2.148490e-09
RMTImprovePerfSomewhat agree                             1.936314e-07
freqPlay_MAX                                             3.093757e-06
edDiploma                                                1.572217e-05
role_MAX1Performer                                       2.360423e-05
bodyImportant_diaphragmModerately important              3.421924e-05
bodyImportant_accessoryModerately important              2.283115e-04
playAbility_MAX                                          3.319523e-04
breathingAwareMost of the time                           3.402756e-03
isPlayingEnoughSomewhat agree                            7.551081e-03
genderFemale                                             8.479598e-03
bodyImportant_airwaysModerately important                2.640397e-02
bodyImportant_ribsModerately important                   2.776379e-02
yrsPlay_MAX                                              3.568955e-02
bodyImportant_postureModerately important                4.230771e-02
dyspSymptomsAir hunger,Breathing a lot/Unplanned breaths 1.446642e-01
bodyImportant_faceModerately important                   1.699976e-01
bodyImportant_respMuscModerately important               3.136196e-01
bodyImportant_absModerately important                    6.432098e-01
                                                         Univariate_OR
countryLiveAlbania                                        9.999997e-01
influencesMedical practitioner,Personal research          1.250000e+00
countryEdAlbania                                          3.130272e+06
WIBassoon                                                 1.909091e+00
RMTImprovePerfSomewhat agree                              1.117059e+00
freqPlay_MAX                                              1.420578e+00
edDiploma                                                 5.921053e-01
role_MAX1Performer                                        1.507594e+00
bodyImportant_diaphragmModerately important               2.450068e+00
bodyImportant_accessoryModerately important               5.545635e-01
playAbility_MAX                                           1.670238e+00
breathingAwareMost of the time                            7.950017e-01
isPlayingEnoughSomewhat agree                             9.689441e-01
genderFemale                                              7.813022e-01
bodyImportant_airwaysModerately important                 1.400466e+00
bodyImportant_ribsModerately important                    4.808771e-01
yrsPlay_MAX                                               9.864806e-01
bodyImportant_postureModerately important                 6.208726e-01
dyspSymptomsAir hunger,Breathing a lot/Unplanned breaths  2.083333e+00
bodyImportant_faceModerately important                    1.698592e+00
bodyImportant_respMuscModerately important                1.010987e+00
bodyImportant_absModerately important                     8.049207e-01
                                                         Univariate_pvalue
countryLiveAlbania                                            1.000000e+00
influencesMedical practitioner,Personal research              8.255554e-01
countryEdAlbania                                              9.888797e-01
WIBassoon                                                     5.912990e-01
RMTImprovePerfSomewhat agree                                  7.254182e-01
freqPlay_MAX                                                  1.170941e-04
edDiploma                                                     9.897626e-02
role_MAX1Performer                                            1.171061e-01
bodyImportant_diaphragmModerately important                   2.665236e-05
bodyImportant_accessoryModerately important                   1.153015e-02
playAbility_MAX                                               1.179186e-06
breathingAwareMost of the time                                2.539079e-01
isPlayingEnoughSomewhat agree                                 9.054043e-01
genderFemale                                                  7.495836e-01
bodyImportant_airwaysModerately important                     2.529371e-01
bodyImportant_ribsModerately important                        1.122812e-03
yrsPlay_MAX                                                   8.072438e-01
bodyImportant_postureModerately important                     4.554637e-02
dyspSymptomsAir hunger,Breathing a lot/Unplanned breaths      4.530090e-01
bodyImportant_faceModerately important                        1.519069e-02
bodyImportant_respMuscModerately important                    9.690128e-01
bodyImportant_absModerately important                         3.210226e-01
Code
# Plot top significant predictors
significant_preds <- results$Predictor[results$ChiSq_pvalue < 0.05]
if(length(significant_preds) > 0) {
  for(pred in significant_preds[1:min(5, length(significant_preds))]) {
    print(paste("Distribution of", pred))
    print(table(df_clean[[pred]], df_clean$useDevice))
    
    # Create bar plot
    counts <- table(df_clean[[pred]], df_clean$useDevice)
    barplot(counts, beside = TRUE, 
            main = paste("Distribution of", pred, "by Device Usage"),
            xlab = pred, ylab = "Count",
            legend.text = c("No Device", "Uses Device"))
  }
}
[1] "Distribution of countryLive"
                                
                                   0   1
  Afghanistan                      4   0
  Albania                          5   0
  Algeria                          1   0
  Antigua and Barbuda              0   1
  Argentina                        3   0
  Armenia                          2   0
  Australia                      232  51
  Austria                          3   0
  Azerbaijan                       2   1
  Bahamas                          0   1
  Bangladesh                       0   3
  Barbados                         0   3
  Belarus                          0   2
  Belgium                          0   2
  Belize                           2   0
  Brazil                           1   0
  Canada                          74   8
  China                            2   0
  Colombia                         1   0
  Czechia                          5   0
  Denmark                          0   1
  Finland                          2   0
  Germany                          8   1
  Hungary                          5   1
  Italy                           30   8
  Japan                            1   0
  Malaysia                         1   0
  Marshall Islands                 1   0
  Mexico                           0   1
  Netherlands                      2   1
  New Zealand                     24   1
  Palestine                        0   1
  Solomon Islands                  0   1
  South Africa                     9   0
  Sweden                           3   0
  Turkey                           1   0
  United Kingdom (UK)            303  13
  United States of America (USA) 457 100
  Vietnam                          0   1

[1] "Distribution of influences"
                                                                                                                          
                                                                                                                             0
  Medical practitioner                                                                                                      15
  Medical practitioner,Personal research                                                                                     3
  Music school ed                                                                                                           27
  Music school ed,Medical practitioner                                                                                       3
  Music school ed,Medical practitioner,Personal research                                                                     2
  Music school ed,Non-musical education                                                                                      6
  Music school ed,Non-musical education,Medical practitioner                                                                 0
  Music school ed,Non-musical education,Personal research                                                                    2
  Music school ed,Personal research                                                                                          9
  Music school ed,Personal research,Non-musical education                                                                    1
  Music teacher(s)                                                                                                         202
  Music teacher(s),Medical practitioner                                                                                     12
  Music teacher(s),Medical practitioner,Non-musical education                                                                2
  Music teacher(s),Medical practitioner,Personal research                                                                    9
  Music teacher(s),Music school ed                                                                                          49
  Music teacher(s),Music school ed,Medical practitioner                                                                      2
  Music teacher(s),Music school ed,Medical practitioner,Personal research                                                    5
  Music teacher(s),Music school ed,Non-musical education                                                                     9
  Music teacher(s),Music school ed,Non-musical education,Medical practitioner,Personal research                              1
  Music teacher(s),Music school ed,Non-musical education,Personal research                                                   2
  Music teacher(s),Music school ed,Other                                                                                     0
  Music teacher(s),Music school ed,Personal research                                                                        25
  Music teacher(s),Music school ed,Personal research,Non-musical education                                                   1
  Music teacher(s),Music school ed,Personal research,Other                                                                   0
  Music teacher(s),Non-musical education                                                                                    28
  Music teacher(s),Non-musical education,Medical practitioner                                                                5
  Music teacher(s),Non-musical education,Medical practitioner,Personal research                                              7
  Music teacher(s),Non-musical education,Medical practitioner,Personal research,Other                                        1
  Music teacher(s),Non-musical education,Other                                                                               3
  Music teacher(s),Non-musical education,Personal research                                                                  21
  Music teacher(s),Other                                                                                                     3
  Music teacher(s),Personal research                                                                                        54
  Music teacher(s),Personal research,Non-musical education                                                                   1
  Music teacher(s),Personal research,Other                                                                                   2
  Music teacher(s),Wind instrumentalist peers                                                                               71
  Music teacher(s),Wind instrumentalist peers,Medical practitioner                                                           8
  Music teacher(s),Wind instrumentalist peers,Medical practitioner,Personal research                                        11
  Music teacher(s),Wind instrumentalist peers,Music school ed                                                               73
  Music teacher(s),Wind instrumentalist peers,Music school ed,Medical practitioner                                           7
  Music teacher(s),Wind instrumentalist peers,Music school ed,Medical practitioner,Non-musical education                     1
  Music teacher(s),Wind instrumentalist peers,Music school ed,Medical practitioner,Personal research                        16
  Music teacher(s),Wind instrumentalist peers,Music school ed,Medical practitioner,Personal research,Other                   2
  Music teacher(s),Wind instrumentalist peers,Music school ed,Non-musical education                                         11
  Music teacher(s),Wind instrumentalist peers,Music school ed,Non-musical education,Medical practitioner                     4
  Music teacher(s),Wind instrumentalist peers,Music school ed,Non-musical education,Medical practitioner,Personal research  12
  Music teacher(s),Wind instrumentalist peers,Music school ed,Non-musical education,Personal research                       21
  Music teacher(s),Wind instrumentalist peers,Music school ed,Other                                                          3
  Music teacher(s),Wind instrumentalist peers,Music school ed,Personal research                                             49
  Music teacher(s),Wind instrumentalist peers,Music school ed,Personal research,Non-musical education                        1
  Music teacher(s),Wind instrumentalist peers,Music school ed,Personal research,Other                                        4
  Music teacher(s),Wind instrumentalist peers,Non-musical education                                                         14
  Music teacher(s),Wind instrumentalist peers,Non-musical education,Medical practitioner                                     3
  Music teacher(s),Wind instrumentalist peers,Non-musical education,Medical practitioner,Personal research                   4
  Music teacher(s),Wind instrumentalist peers,Non-musical education,Other                                                    1
  Music teacher(s),Wind instrumentalist peers,Non-musical education,Personal research                                       14
  Music teacher(s),Wind instrumentalist peers,Other                                                                          1
  Music teacher(s),Wind instrumentalist peers,Personal research                                                             50
  Music teacher(s),Wind instrumentalist peers,Personal research,Medical practitioner                                         1
  Music teacher(s),Wind instrumentalist peers,Personal research,Non-musical education                                        2
  Music teacher(s),Wind instrumentalist peers,Personal research,Non-musical education,Other                                  1
  Music teacher(s),Wind instrumentalist peers,Personal research,Other                                                        1
  Non-musical education                                                                                                     36
  Non-musical education,Medical practitioner                                                                                 6
  Non-musical education,Medical practitioner,Personal research                                                               6
  Non-musical education,Other                                                                                                6
  Non-musical education,Personal research                                                                                   13
  Non-musical education,Personal research,Other                                                                              1
  Not sure                                                                                                                  64
  Other                                                                                                                     12
  Personal research                                                                                                         67
  Personal research,Non-musical education                                                                                    1
  Wind instrumentalist peers                                                                                                23
  Wind instrumentalist peers,Medical practitioner                                                                            3
  Wind instrumentalist peers,Medical practitioner,Personal research                                                          5
  Wind instrumentalist peers,Music school ed                                                                                 5
  Wind instrumentalist peers,Music school ed,Medical practitioner                                                            2
  Wind instrumentalist peers,Music school ed,Medical practitioner,Personal research                                          0
  Wind instrumentalist peers,Music school ed,Non-musical education                                                           0
  Wind instrumentalist peers,Music school ed,Non-musical education,Personal research                                         1
  Wind instrumentalist peers,Music school ed,Personal research                                                               7
  Wind instrumentalist peers,Non-musical education                                                                           4
  Wind instrumentalist peers,Non-musical education,Medical practitioner                                                      3
  Wind instrumentalist peers,Non-musical education,Medical practitioner,Personal research                                    2
  Wind instrumentalist peers,Non-musical education,Other                                                                     0
  Wind instrumentalist peers,Non-musical education,Personal research                                                         5
  Wind instrumentalist peers,Personal research                                                                              14
                                                                                                                          
                                                                                                                             1
  Medical practitioner                                                                                                       8
  Medical practitioner,Personal research                                                                                     2
  Music school ed                                                                                                            5
  Music school ed,Medical practitioner                                                                                       0
  Music school ed,Medical practitioner,Personal research                                                                     3
  Music school ed,Non-musical education                                                                                      0
  Music school ed,Non-musical education,Medical practitioner                                                                 1
  Music school ed,Non-musical education,Personal research                                                                    2
  Music school ed,Personal research                                                                                          0
  Music school ed,Personal research,Non-musical education                                                                    0
  Music teacher(s)                                                                                                           7
  Music teacher(s),Medical practitioner                                                                                      2
  Music teacher(s),Medical practitioner,Non-musical education                                                                0
  Music teacher(s),Medical practitioner,Personal research                                                                    0
  Music teacher(s),Music school ed                                                                                           6
  Music teacher(s),Music school ed,Medical practitioner                                                                      2
  Music teacher(s),Music school ed,Medical practitioner,Personal research                                                    1
  Music teacher(s),Music school ed,Non-musical education                                                                     2
  Music teacher(s),Music school ed,Non-musical education,Medical practitioner,Personal research                              1
  Music teacher(s),Music school ed,Non-musical education,Personal research                                                   0
  Music teacher(s),Music school ed,Other                                                                                     1
  Music teacher(s),Music school ed,Personal research                                                                         5
  Music teacher(s),Music school ed,Personal research,Non-musical education                                                   0
  Music teacher(s),Music school ed,Personal research,Other                                                                   1
  Music teacher(s),Non-musical education                                                                                     0
  Music teacher(s),Non-musical education,Medical practitioner                                                                0
  Music teacher(s),Non-musical education,Medical practitioner,Personal research                                              1
  Music teacher(s),Non-musical education,Medical practitioner,Personal research,Other                                        0
  Music teacher(s),Non-musical education,Other                                                                               0
  Music teacher(s),Non-musical education,Personal research                                                                   2
  Music teacher(s),Other                                                                                                     1
  Music teacher(s),Personal research                                                                                         6
  Music teacher(s),Personal research,Non-musical education                                                                   0
  Music teacher(s),Personal research,Other                                                                                   0
  Music teacher(s),Wind instrumentalist peers                                                                                8
  Music teacher(s),Wind instrumentalist peers,Medical practitioner                                                           4
  Music teacher(s),Wind instrumentalist peers,Medical practitioner,Personal research                                         2
  Music teacher(s),Wind instrumentalist peers,Music school ed                                                               10
  Music teacher(s),Wind instrumentalist peers,Music school ed,Medical practitioner                                           0
  Music teacher(s),Wind instrumentalist peers,Music school ed,Medical practitioner,Non-musical education                     0
  Music teacher(s),Wind instrumentalist peers,Music school ed,Medical practitioner,Personal research                         4
  Music teacher(s),Wind instrumentalist peers,Music school ed,Medical practitioner,Personal research,Other                   1
  Music teacher(s),Wind instrumentalist peers,Music school ed,Non-musical education                                          1
  Music teacher(s),Wind instrumentalist peers,Music school ed,Non-musical education,Medical practitioner                     0
  Music teacher(s),Wind instrumentalist peers,Music school ed,Non-musical education,Medical practitioner,Personal research   9
  Music teacher(s),Wind instrumentalist peers,Music school ed,Non-musical education,Personal research                        8
  Music teacher(s),Wind instrumentalist peers,Music school ed,Other                                                          0
  Music teacher(s),Wind instrumentalist peers,Music school ed,Personal research                                             16
  Music teacher(s),Wind instrumentalist peers,Music school ed,Personal research,Non-musical education                        0
  Music teacher(s),Wind instrumentalist peers,Music school ed,Personal research,Other                                        0
  Music teacher(s),Wind instrumentalist peers,Non-musical education                                                          1
  Music teacher(s),Wind instrumentalist peers,Non-musical education,Medical practitioner                                     0
  Music teacher(s),Wind instrumentalist peers,Non-musical education,Medical practitioner,Personal research                   3
  Music teacher(s),Wind instrumentalist peers,Non-musical education,Other                                                    0
  Music teacher(s),Wind instrumentalist peers,Non-musical education,Personal research                                        5
  Music teacher(s),Wind instrumentalist peers,Other                                                                          0
  Music teacher(s),Wind instrumentalist peers,Personal research                                                             14
  Music teacher(s),Wind instrumentalist peers,Personal research,Medical practitioner                                         0
  Music teacher(s),Wind instrumentalist peers,Personal research,Non-musical education                                        0
  Music teacher(s),Wind instrumentalist peers,Personal research,Non-musical education,Other                                  0
  Music teacher(s),Wind instrumentalist peers,Personal research,Other                                                        0
  Non-musical education                                                                                                     10
  Non-musical education,Medical practitioner                                                                                 4
  Non-musical education,Medical practitioner,Personal research                                                               1
  Non-musical education,Other                                                                                                0
  Non-musical education,Personal research                                                                                    2
  Non-musical education,Personal research,Other                                                                              0
  Not sure                                                                                                                   3
  Other                                                                                                                      0
  Personal research                                                                                                          7
  Personal research,Non-musical education                                                                                    0
  Wind instrumentalist peers                                                                                                 4
  Wind instrumentalist peers,Medical practitioner                                                                            2
  Wind instrumentalist peers,Medical practitioner,Personal research                                                          0
  Wind instrumentalist peers,Music school ed                                                                                 4
  Wind instrumentalist peers,Music school ed,Medical practitioner                                                            2
  Wind instrumentalist peers,Music school ed,Medical practitioner,Personal research                                          3
  Wind instrumentalist peers,Music school ed,Non-musical education                                                           1
  Wind instrumentalist peers,Music school ed,Non-musical education,Personal research                                         0
  Wind instrumentalist peers,Music school ed,Personal research                                                               3
  Wind instrumentalist peers,Non-musical education                                                                           2
  Wind instrumentalist peers,Non-musical education,Medical practitioner                                                      3
  Wind instrumentalist peers,Non-musical education,Medical practitioner,Personal research                                    0
  Wind instrumentalist peers,Non-musical education,Other                                                                     1
  Wind instrumentalist peers,Non-musical education,Personal research                                                         1
  Wind instrumentalist peers,Personal research                                                                               4

[1] "Distribution of countryEd"
                                
                                   0   1
  Afghanistan                      5   0
  Albania                          5   1
  Andorra                          0   1
  Angola                           1   1
  Antigua and Barbuda              0   2
  Argentina                        3   0
  Armenia                          2   0
  Australia                      225  53
  Austria                          2   0
  Azerbaijan                       1   1
  Bahamas                          0   1
  Bangladesh                       0   2
  Belarus                          2   1
  Belgium                          1   1
  Brazil                           1   0
  Canada                          76   8
  Colombia                         1   0
  Czechia                          5   0
  Denmark                          0   1
  Finland                          1   0
  Germany                          8   3
  Hungary                          6   1
  Ireland                          1   0
  Italy                           29   5
  Marshall Islands                 1   0
  Netherlands                      2   1
  New Zealand                     20   1
  Palestine                        0   1
  Solomon Islands                  0   1
  South Africa                     7   0
  Sweden                           3   0
  Switzerland                      1   1
  Turkey                           1   0
  United Kingdom (UK)            310  13
  United States of America (USA) 463 101
  Uzbekistan                       1   0
  Vietnam                          0   1

[1] "Distribution of WI"
                                                                                                                
                                                                                                                   0
  Bagpipes                                                                                                        14
  Bassoon                                                                                                         22
  Bassoon,Other                                                                                                    1
  Bassoon,Saxophone                                                                                                5
  Bassoon,Saxophone,Tuba                                                                                           1
  Bassoon,Trombone                                                                                                 1
  Bassoon,Trumpet,Trombone                                                                                         0
  Clarinet                                                                                                        92
  Clarinet,Bagpipes                                                                                                2
  Clarinet,Bassoon                                                                                                 1
  Clarinet,Bassoon,Saxophone                                                                                       3
  Clarinet,Bassoon,Saxophone,Trombone                                                                              1
  Clarinet,Bassoon,Trombone                                                                                        1
  Clarinet,Bassoon,Trombone,Tuba                                                                                   0
  Clarinet,Flute,Recorder,Saxophone                                                                                1
  Clarinet,Flute,Saxophone,Other                                                                                   1
  Clarinet,French Horn,Trombone                                                                                    0
  Clarinet,Other                                                                                                   3
  Clarinet,Saxophone                                                                                              41
  Clarinet,Saxophone,Bagpipes                                                                                      1
  Clarinet,Saxophone,Euphonium                                                                                     2
  Clarinet,Saxophone,Other                                                                                         2
  Clarinet,Saxophone,Trombone                                                                                      3
  Clarinet,Saxophone,Trumpet                                                                                       1
  Clarinet,Saxophone,Trumpet,Bagpipes                                                                              0
  Clarinet,Saxophone,Trumpet,Trombone,Euphonium                                                                    2
  Clarinet,Saxophone,Trumpet,Trombone,Tuba,Euphonium                                                               1
  Clarinet,Saxophone,Tuba                                                                                          1
  Clarinet,Trumpet                                                                                                 6
  Clarinet,Trumpet,French Horn                                                                                     1
  Clarinet,Trumpet,French Horn,Other                                                                               1
  Clarinet,Trumpet,Other                                                                                           2
  Clarinet,Trumpet,Trombone                                                                                        1
  Clarinet,Trumpet,Trombone,Tuba,Euphonium                                                                         1
  Clarinet,Tuba                                                                                                    1
  Euphonium                                                                                                       10
  Flute                                                                                                           76
  Flute,Bagpipes                                                                                                   3
  Flute,Bassoon,Saxophone,Trumpet,Bagpipes                                                                         0
  Flute,Bassoon,Trumpet,French Horn,Trombone,Euphonium                                                             1
  Flute,Clarinet                                                                                                   8
  Flute,Clarinet,Bassoon,Saxophone                                                                                 1
  Flute,Clarinet,Bassoon,Saxophone,Trumpet,Trombone,Euphonium                                                      1
  Flute,Clarinet,Bassoon,Trumpet                                                                                   1
  Flute,Clarinet,Euphonium                                                                                         1
  Flute,Clarinet,Euphonium,Bagpipes                                                                                1
  Flute,Clarinet,French Horn,Euphonium                                                                             0
  Flute,Clarinet,Saxophone                                                                                        36
  Flute,Clarinet,Saxophone,Euphonium                                                                               1
  Flute,Clarinet,Saxophone,Trombone                                                                                3
  Flute,Clarinet,Saxophone,Trumpet                                                                                 2
  Flute,Clarinet,Saxophone,Trumpet,Bagpipes                                                                        1
  Flute,Clarinet,Saxophone,Trumpet,French Horn                                                                     0
  Flute,Clarinet,Saxophone,Trumpet,French Horn,Trombone,Tuba,Euphonium                                             2
  Flute,Clarinet,Saxophone,Trumpet,French Horn/Horn,Other                                                          1
  Flute,Clarinet,Saxophone,Trumpet,Tuba                                                                            1
  Flute,Clarinet,Saxophone,Tuba                                                                                    0
  Flute,Clarinet,Trumpet,Euphonium                                                                                 0
  Flute,Clarinet,Trumpet,French Horn,Trombone,Euphonium                                                            1
  Flute,Clarinet,Trumpet,Tuba,Other                                                                                1
  Flute,Clarinet,Tuba                                                                                              1
  Flute,Euphonium                                                                                                  2
  Flute,French Horn                                                                                                1
  Flute,Oboe/Cor Anglais                                                                                           3
  Flute,Oboe/Cor Anglais,Bagpipes                                                                                  1
  Flute,Oboe/Cor Anglais,Bassoon,Saxophone,Trombone,Tuba                                                           1
  Flute,Oboe/Cor Anglais,Clarinet                                                                                  1
  Flute,Oboe/Cor Anglais,Clarinet,Bassoon,Saxophone                                                                1
  Flute,Oboe/Cor Anglais,Clarinet,Bassoon,Saxophone,Trumpet,Euphonium,Other                                        1
  Flute,Oboe/Cor Anglais,Clarinet,Saxophone                                                                        1
  Flute,Oboe/Cor Anglais,Saxophone                                                                                 3
  Flute,Oboe/Cor Anglais,Saxophone,Bagpipes                                                                        1
  Flute,Other                                                                                                      3
  Flute,Piccolo                                                                                                   60
  Flute,Piccolo,Bassoon                                                                                            2
  Flute,Piccolo,Clarinet                                                                                           2
  Flute,Piccolo,Clarinet,Bassoon,Saxophone                                                                         3
  Flute,Piccolo,Clarinet,French Horn                                                                               0
  Flute,Piccolo,Clarinet,Saxophone                                                                                 8
  Flute,Piccolo,Clarinet,Saxophone,Euphonium                                                                       0
  Flute,Piccolo,Clarinet,Saxophone,Other                                                                           1
  Flute,Piccolo,Clarinet,Saxophone,Trumpet                                                                         1
  Flute,Piccolo,Clarinet,Saxophone,Trumpet,Trombone                                                                1
  Flute,Piccolo,Oboe/Cor Anglais                                                                                   1
  Flute,Piccolo,Oboe/Cor Anglais,Bassoon,Trumpet,Trombone,Bagpipes                                                 0
  Flute,Piccolo,Oboe/Cor Anglais,Clarinet                                                                          1
  Flute,Piccolo,Oboe/Cor Anglais,Clarinet,Bassoon,Saxophone                                                        1
  Flute,Piccolo,Oboe/Cor Anglais,Clarinet,Bassoon,Saxophone,Trumpet,French Horn,Tuba                               1
  Flute,Piccolo,Oboe/Cor Anglais,Clarinet,Saxophone                                                                5
  Flute,Piccolo,Oboe/Cor Anglais,Saxophone                                                                         1
  Flute,Piccolo,Recorder                                                                                           7
  Flute,Piccolo,Recorder,Bassoon                                                                                   0
  Flute,Piccolo,Recorder,Clarinet,Saxophone                                                                        2
  Flute,Piccolo,Recorder,Clarinet,Saxophone,Trumpet                                                                1
  Flute,Piccolo,Recorder,Clarinet,Saxophone,Trumpet,French Horn,Trombone                                           1
  Flute,Piccolo,Recorder,Oboe/Cor Anglais,Bassoon,French Horn                                                      1
  Flute,Piccolo,Recorder,Oboe/Cor Anglais,Clarinet,Bassoon                                                         0
  Flute,Piccolo,Recorder,Oboe/Cor Anglais,Clarinet,Bassoon,Saxophone                                               1
  Flute,Piccolo,Recorder,Oboe/Cor Anglais,Clarinet,Bassoon,Saxophone,Trumpet,French Horn,Trombone,Tuba,Euphonium   0
  Flute,Piccolo,Recorder,Oboe/Cor Anglais,Clarinet,Saxophone                                                       2
  Flute,Piccolo,Recorder,Oboe/Cor Anglais,Clarinet,Saxophone,Other                                                 1
  Flute,Piccolo,Recorder,Oboe/Cor Anglais,Clarinet,Saxophone,Trombone                                              1
  Flute,Piccolo,Recorder,Other                                                                                     1
  Flute,Piccolo,Recorder,Saxophone                                                                                 1
  Flute,Piccolo,Recorder,Saxophone,Trombone                                                                        1
  Flute,Piccolo,Recorder,Saxophone,Trumpet,Euphonium                                                               0
  Flute,Piccolo,Recorder,Trumpet                                                                                   1
  Flute,Piccolo,Saxophone                                                                                          6
  Flute,Piccolo,Trumpet                                                                                            2
  Flute,Piccolo,Trumpet,Bagpipes                                                                                   0
  Flute,Recorder                                                                                                   4
  Flute,Recorder,Clarinet                                                                                          2
  Flute,Recorder,Clarinet,Euphonium                                                                                0
  Flute,Recorder,Clarinet,Saxophone                                                                                5
  Flute,Recorder,Clarinet,Saxophone,Bagpipes                                                                       1
  Flute,Recorder,Clarinet,Saxophone,Other                                                                          0
  Flute,Recorder,Clarinet,Trombone,Tuba,Euphonium                                                                  1
  Flute,Recorder,Clarinet,Trumpet                                                                                  1
  Flute,Recorder,Clarinet,Trumpet,Trombone,Euphonium                                                               2
  Flute,Recorder,Oboe/Cor Anglais,Clarinet,Saxophone,Trumpet                                                       1
  Flute,Recorder,Oboe/Cor Anglais,Saxophone                                                                        0
  Flute,Recorder,Other                                                                                             1
  Flute,Recorder,Saxophone                                                                                         3
  Flute,Recorder,Trombone                                                                                          2
  Flute,Recorder,Trumpet,French Horn,Trombone,Euphonium                                                            1
  Flute,Saxophone                                                                                                 19
  Flute,Saxophone,Other                                                                                            2
  Flute,Saxophone,Trombone                                                                                         2
  Flute,Saxophone,Trumpet                                                                                          4
  Flute,Saxophone,Trumpet,French Horn                                                                              0
  Flute,Trombone                                                                                                   1
  Flute,Trombone,Bagpipes                                                                                          1
  Flute,Trombone,Other                                                                                             1
  Flute,Trumpet                                                                                                    6
  Flute,Trumpet,Bagpipes                                                                                           1
  Flute,Trumpet,French Horn                                                                                        0
  Flute,Trumpet,Other                                                                                              1
  Flute,Trumpet,Trombone                                                                                           0
  Flute,Trumpet,Trombone,Tuba,Euphonium                                                                            0
  Flute,Tuba                                                                                                       1
  French Horn                                                                                                     53
  French Horn,Bagpipes                                                                                             1
  French Horn,Other                                                                                                3
  French Horn,Trombone                                                                                             2
  French Horn,Trombone,Tuba,Bagpipes                                                                               0
  French Horn,Tuba                                                                                                 1
  Oboe/Cor Anglais                                                                                                40
  Oboe/Cor Anglais,Bassoon                                                                                         4
  Oboe/Cor Anglais,Bassoon,Saxophone,Trombone                                                                      1
  Oboe/Cor Anglais,Clarinet                                                                                        9
  Oboe/Cor Anglais,Clarinet,Bassoon                                                                                1
  Oboe/Cor Anglais,Clarinet,Bassoon,Saxophone                                                                      1
  Oboe/Cor Anglais,Clarinet,Bassoon,Trumpet                                                                        1
  Oboe/Cor Anglais,Clarinet,French Horn                                                                            1
  Oboe/Cor Anglais,Clarinet,Saxophone                                                                              0
  Oboe/Cor Anglais,Clarinet,Trombone                                                                               0
  Oboe/Cor Anglais,Clarinet,Trombone,Tuba                                                                          0
  Oboe/Cor Anglais,French Horn                                                                                     2
  Oboe/Cor Anglais,French Horn,Tuba,Euphonium                                                                      1
  Oboe/Cor Anglais,Saxophone                                                                                       5
  Oboe/Cor Anglais,Saxophone,Trombone                                                                              1
  Oboe/Cor Anglais,Saxophone,Tuba                                                                                  1
  Oboe/Cor Anglais,Trumpet,Trombone                                                                                1
  Other                                                                                                           22
  Piccolo                                                                                                         14
  Piccolo,Bagpipes                                                                                                 2
  Piccolo,Bassoon,Saxophone,Tuba                                                                                   1
  Piccolo,Bassoon,Tuba                                                                                             0
  Piccolo,Clarinet                                                                                                 1
  Piccolo,Oboe/Cor Anglais                                                                                         1
  Piccolo,Oboe/Cor Anglais,Bassoon,Bagpipes                                                                        0
  Piccolo,Oboe/Cor Anglais,Clarinet,Bassoon                                                                        1
  Piccolo,Oboe/Cor Anglais,French Horn                                                                             1
  Piccolo,Oboe/Cor Anglais,French Horn,Trombone                                                                    1
  Piccolo,Oboe/Cor Anglais,Saxophone,Trombone,Bagpipes                                                             1
  Piccolo,Oboe/Cor Anglais,Trombone,Euphonium                                                                      0
  Piccolo,Oboe/Cor Anglais,Trumpet                                                                                 1
  Piccolo,Oboe/Cor Anglais,Trumpet,Trombone                                                                        0
  Piccolo,Recorder,Saxophone                                                                                       0
  Piccolo,Saxophone                                                                                                3
  Piccolo,Saxophone,Bagpipes                                                                                       0
  Piccolo,Saxophone,Trombone                                                                                       0
  Piccolo,Trombone,Tuba,Bagpipes                                                                                   1
  Piccolo,Trumpet,Bagpipes                                                                                         1
  Piccolo,Trumpet,French Horn                                                                                      1
  Piccolo,Tuba                                                                                                     0
  Recorder                                                                                                         8
  Recorder,Bassoon,French Horn                                                                                     1
  Recorder,Bassoon,Trumpet                                                                                         0
  Recorder,Clarinet                                                                                                6
  Recorder,Clarinet,Other                                                                                          2
  Recorder,Clarinet,Saxophone                                                                                      9
  Recorder,Clarinet,Saxophone,French Horn,Tuba,Euphonium,Bagpipes                                                  0
  Recorder,Clarinet,Saxophone,Other                                                                                1
  Recorder,Clarinet,Saxophone,Trumpet                                                                              1
  Recorder,Clarinet,Saxophone,Trumpet,French Horn,Trombone,Tuba,Euphonium,Other                                    1
  Recorder,Clarinet,Trumpet                                                                                        0
  Recorder,Clarinet,Tuba                                                                                           1
  Recorder,French Horn                                                                                             1
  Recorder,French Horn,Other                                                                                       1
  Recorder,Oboe/Cor Anglais                                                                                        3
  Recorder,Oboe/Cor Anglais,Bassoon                                                                                0
  Recorder,Oboe/Cor Anglais,Other                                                                                  1
  Recorder,Oboe/Cor Anglais,Saxophone                                                                              1
  Recorder,Saxophone                                                                                               5
  Recorder,Saxophone,Trumpet                                                                                       1
  Recorder,Saxophone,Trumpet,French Horn                                                                           0
  Recorder,Saxophone,Trumpet,French Horn,Trombone                                                                  1
  Recorder,Trombone                                                                                                2
  Recorder,Trombone,Euphonium                                                                                      1
  Recorder,Trumpet                                                                                                 3
  Recorder,Trumpet,Euphonium                                                                                       0
  Recorder,Trumpet,French Horn,Trombone,Tuba,Euphonium,Bagpipes,Other                                              1
  Recorder,Trumpet,Trombone                                                                                        1
  Saxophone                                                                                                      105
  Saxophone,Bagpipes                                                                                               2
  Saxophone,Euphonium                                                                                              0
  Saxophone,French Horn                                                                                            2
  Saxophone,French Horn,Trombone                                                                                   1
  Saxophone,Other                                                                                                  2
  Saxophone,Trombone                                                                                               2
  Saxophone,Trombone,Tuba                                                                                          1
  Saxophone,Trombone,Tuba,Euphonium,Bagpipes                                                                       1
  Saxophone,Trumpet                                                                                                3
  Saxophone,Trumpet,Euphonium                                                                                      0
  Saxophone,Trumpet,Trombone                                                                                       2
  Saxophone,Trumpet,Trombone,Euphonium                                                                             1
  Saxophone,Tuba                                                                                                   2
  Trombone                                                                                                        37
  Trombone,Bagpipes                                                                                                1
  Trombone,Euphonium                                                                                              12
  Trombone,Other                                                                                                   2
  Trombone,Tuba                                                                                                    4
  Trombone,Tuba,Euphonium                                                                                          9
  Trumpet                                                                                                         99
  Trumpet,Bagpipes                                                                                                 1
  Trumpet,Euphonium                                                                                                3
  Trumpet,Euphonium,Other                                                                                          2
  Trumpet,French Horn                                                                                             10
  Trumpet,French Horn,Euphonium                                                                                    1
  Trumpet,French Horn,Other                                                                                        1
  Trumpet,French Horn,Trombone                                                                                     3
  Trumpet,French Horn,Trombone,Euphonium                                                                           5
  Trumpet,French Horn,Trombone,Tuba,Euphonium                                                                      2
  Trumpet,French Horn,Trombone,Tuba,Euphonium,Other                                                                1
  Trumpet,Other                                                                                                   13
  Trumpet,Trombone                                                                                                12
  Trumpet,Trombone,Euphonium                                                                                       1
  Trumpet,Trombone,Euphonium,Bagpipes                                                                              0
  Trumpet,Trombone,Euphonium,Other                                                                                 1
  Trumpet,Trombone,Tuba                                                                                            0
  Trumpet,Trombone,Tuba,Euphonium                                                                                  4
  Trumpet,Tuba                                                                                                     1
  Trumpet,Tuba,Bagpipes                                                                                            1
  Trumpet,Tuba,Euphonium                                                                                           1
  Tuba                                                                                                            26
  Tuba,Euphonium                                                                                                   6
                                                                                                                
                                                                                                                   1
  Bagpipes                                                                                                         1
  Bassoon                                                                                                          3
  Bassoon,Other                                                                                                    0
  Bassoon,Saxophone                                                                                                0
  Bassoon,Saxophone,Tuba                                                                                           0
  Bassoon,Trombone                                                                                                 0
  Bassoon,Trumpet,Trombone                                                                                         1
  Clarinet                                                                                                         8
  Clarinet,Bagpipes                                                                                                0
  Clarinet,Bassoon                                                                                                 0
  Clarinet,Bassoon,Saxophone                                                                                       0
  Clarinet,Bassoon,Saxophone,Trombone                                                                              0
  Clarinet,Bassoon,Trombone                                                                                        0
  Clarinet,Bassoon,Trombone,Tuba                                                                                   1
  Clarinet,Flute,Recorder,Saxophone                                                                                0
  Clarinet,Flute,Saxophone,Other                                                                                   0
  Clarinet,French Horn,Trombone                                                                                    1
  Clarinet,Other                                                                                                   0
  Clarinet,Saxophone                                                                                               4
  Clarinet,Saxophone,Bagpipes                                                                                      0
  Clarinet,Saxophone,Euphonium                                                                                     0
  Clarinet,Saxophone,Other                                                                                         0
  Clarinet,Saxophone,Trombone                                                                                      0
  Clarinet,Saxophone,Trumpet                                                                                       0
  Clarinet,Saxophone,Trumpet,Bagpipes                                                                              1
  Clarinet,Saxophone,Trumpet,Trombone,Euphonium                                                                    0
  Clarinet,Saxophone,Trumpet,Trombone,Tuba,Euphonium                                                               0
  Clarinet,Saxophone,Tuba                                                                                          0
  Clarinet,Trumpet                                                                                                 0
  Clarinet,Trumpet,French Horn                                                                                     0
  Clarinet,Trumpet,French Horn,Other                                                                               0
  Clarinet,Trumpet,Other                                                                                           0
  Clarinet,Trumpet,Trombone                                                                                        0
  Clarinet,Trumpet,Trombone,Tuba,Euphonium                                                                         0
  Clarinet,Tuba                                                                                                    0
  Euphonium                                                                                                        2
  Flute                                                                                                            3
  Flute,Bagpipes                                                                                                   0
  Flute,Bassoon,Saxophone,Trumpet,Bagpipes                                                                         1
  Flute,Bassoon,Trumpet,French Horn,Trombone,Euphonium                                                             0
  Flute,Clarinet                                                                                                   2
  Flute,Clarinet,Bassoon,Saxophone                                                                                 1
  Flute,Clarinet,Bassoon,Saxophone,Trumpet,Trombone,Euphonium                                                      0
  Flute,Clarinet,Bassoon,Trumpet                                                                                   0
  Flute,Clarinet,Euphonium                                                                                         0
  Flute,Clarinet,Euphonium,Bagpipes                                                                                0
  Flute,Clarinet,French Horn,Euphonium                                                                             1
  Flute,Clarinet,Saxophone                                                                                         4
  Flute,Clarinet,Saxophone,Euphonium                                                                               0
  Flute,Clarinet,Saxophone,Trombone                                                                                0
  Flute,Clarinet,Saxophone,Trumpet                                                                                 0
  Flute,Clarinet,Saxophone,Trumpet,Bagpipes                                                                        0
  Flute,Clarinet,Saxophone,Trumpet,French Horn                                                                     1
  Flute,Clarinet,Saxophone,Trumpet,French Horn,Trombone,Tuba,Euphonium                                             1
  Flute,Clarinet,Saxophone,Trumpet,French Horn/Horn,Other                                                          0
  Flute,Clarinet,Saxophone,Trumpet,Tuba                                                                            0
  Flute,Clarinet,Saxophone,Tuba                                                                                    1
  Flute,Clarinet,Trumpet,Euphonium                                                                                 1
  Flute,Clarinet,Trumpet,French Horn,Trombone,Euphonium                                                            0
  Flute,Clarinet,Trumpet,Tuba,Other                                                                                0
  Flute,Clarinet,Tuba                                                                                              0
  Flute,Euphonium                                                                                                  0
  Flute,French Horn                                                                                                0
  Flute,Oboe/Cor Anglais                                                                                           0
  Flute,Oboe/Cor Anglais,Bagpipes                                                                                  0
  Flute,Oboe/Cor Anglais,Bassoon,Saxophone,Trombone,Tuba                                                           0
  Flute,Oboe/Cor Anglais,Clarinet                                                                                  0
  Flute,Oboe/Cor Anglais,Clarinet,Bassoon,Saxophone                                                                0
  Flute,Oboe/Cor Anglais,Clarinet,Bassoon,Saxophone,Trumpet,Euphonium,Other                                        0
  Flute,Oboe/Cor Anglais,Clarinet,Saxophone                                                                        0
  Flute,Oboe/Cor Anglais,Saxophone                                                                                 1
  Flute,Oboe/Cor Anglais,Saxophone,Bagpipes                                                                        0
  Flute,Other                                                                                                      0
  Flute,Piccolo                                                                                                   11
  Flute,Piccolo,Bassoon                                                                                            0
  Flute,Piccolo,Clarinet                                                                                           0
  Flute,Piccolo,Clarinet,Bassoon,Saxophone                                                                         0
  Flute,Piccolo,Clarinet,French Horn                                                                               2
  Flute,Piccolo,Clarinet,Saxophone                                                                                 1
  Flute,Piccolo,Clarinet,Saxophone,Euphonium                                                                       1
  Flute,Piccolo,Clarinet,Saxophone,Other                                                                           0
  Flute,Piccolo,Clarinet,Saxophone,Trumpet                                                                         0
  Flute,Piccolo,Clarinet,Saxophone,Trumpet,Trombone                                                                0
  Flute,Piccolo,Oboe/Cor Anglais                                                                                   0
  Flute,Piccolo,Oboe/Cor Anglais,Bassoon,Trumpet,Trombone,Bagpipes                                                 1
  Flute,Piccolo,Oboe/Cor Anglais,Clarinet                                                                          1
  Flute,Piccolo,Oboe/Cor Anglais,Clarinet,Bassoon,Saxophone                                                        1
  Flute,Piccolo,Oboe/Cor Anglais,Clarinet,Bassoon,Saxophone,Trumpet,French Horn,Tuba                               0
  Flute,Piccolo,Oboe/Cor Anglais,Clarinet,Saxophone                                                                0
  Flute,Piccolo,Oboe/Cor Anglais,Saxophone                                                                         0
  Flute,Piccolo,Recorder                                                                                           2
  Flute,Piccolo,Recorder,Bassoon                                                                                   1
  Flute,Piccolo,Recorder,Clarinet,Saxophone                                                                        0
  Flute,Piccolo,Recorder,Clarinet,Saxophone,Trumpet                                                                0
  Flute,Piccolo,Recorder,Clarinet,Saxophone,Trumpet,French Horn,Trombone                                           0
  Flute,Piccolo,Recorder,Oboe/Cor Anglais,Bassoon,French Horn                                                      0
  Flute,Piccolo,Recorder,Oboe/Cor Anglais,Clarinet,Bassoon                                                         1
  Flute,Piccolo,Recorder,Oboe/Cor Anglais,Clarinet,Bassoon,Saxophone                                               0
  Flute,Piccolo,Recorder,Oboe/Cor Anglais,Clarinet,Bassoon,Saxophone,Trumpet,French Horn,Trombone,Tuba,Euphonium   1
  Flute,Piccolo,Recorder,Oboe/Cor Anglais,Clarinet,Saxophone                                                       0
  Flute,Piccolo,Recorder,Oboe/Cor Anglais,Clarinet,Saxophone,Other                                                 0
  Flute,Piccolo,Recorder,Oboe/Cor Anglais,Clarinet,Saxophone,Trombone                                              0
  Flute,Piccolo,Recorder,Other                                                                                     0
  Flute,Piccolo,Recorder,Saxophone                                                                                 0
  Flute,Piccolo,Recorder,Saxophone,Trombone                                                                        0
  Flute,Piccolo,Recorder,Saxophone,Trumpet,Euphonium                                                               1
  Flute,Piccolo,Recorder,Trumpet                                                                                   0
  Flute,Piccolo,Saxophone                                                                                          1
  Flute,Piccolo,Trumpet                                                                                            0
  Flute,Piccolo,Trumpet,Bagpipes                                                                                   1
  Flute,Recorder                                                                                                   1
  Flute,Recorder,Clarinet                                                                                          0
  Flute,Recorder,Clarinet,Euphonium                                                                                1
  Flute,Recorder,Clarinet,Saxophone                                                                                0
  Flute,Recorder,Clarinet,Saxophone,Bagpipes                                                                       0
  Flute,Recorder,Clarinet,Saxophone,Other                                                                          1
  Flute,Recorder,Clarinet,Trombone,Tuba,Euphonium                                                                  0
  Flute,Recorder,Clarinet,Trumpet                                                                                  0
  Flute,Recorder,Clarinet,Trumpet,Trombone,Euphonium                                                               0
  Flute,Recorder,Oboe/Cor Anglais,Clarinet,Saxophone,Trumpet                                                       0
  Flute,Recorder,Oboe/Cor Anglais,Saxophone                                                                        1
  Flute,Recorder,Other                                                                                             0
  Flute,Recorder,Saxophone                                                                                         0
  Flute,Recorder,Trombone                                                                                          0
  Flute,Recorder,Trumpet,French Horn,Trombone,Euphonium                                                            0
  Flute,Saxophone                                                                                                  1
  Flute,Saxophone,Other                                                                                            0
  Flute,Saxophone,Trombone                                                                                         0
  Flute,Saxophone,Trumpet                                                                                          2
  Flute,Saxophone,Trumpet,French Horn                                                                              1
  Flute,Trombone                                                                                                   0
  Flute,Trombone,Bagpipes                                                                                          0
  Flute,Trombone,Other                                                                                             0
  Flute,Trumpet                                                                                                    0
  Flute,Trumpet,Bagpipes                                                                                           0
  Flute,Trumpet,French Horn                                                                                        1
  Flute,Trumpet,Other                                                                                              0
  Flute,Trumpet,Trombone                                                                                           1
  Flute,Trumpet,Trombone,Tuba,Euphonium                                                                            1
  Flute,Tuba                                                                                                       0
  French Horn                                                                                                     16
  French Horn,Bagpipes                                                                                             0
  French Horn,Other                                                                                                1
  French Horn,Trombone                                                                                             0
  French Horn,Trombone,Tuba,Bagpipes                                                                               1
  French Horn,Tuba                                                                                                 0
  Oboe/Cor Anglais                                                                                                 3
  Oboe/Cor Anglais,Bassoon                                                                                         0
  Oboe/Cor Anglais,Bassoon,Saxophone,Trombone                                                                      0
  Oboe/Cor Anglais,Clarinet                                                                                        2
  Oboe/Cor Anglais,Clarinet,Bassoon                                                                                0
  Oboe/Cor Anglais,Clarinet,Bassoon,Saxophone                                                                      0
  Oboe/Cor Anglais,Clarinet,Bassoon,Trumpet                                                                        0
  Oboe/Cor Anglais,Clarinet,French Horn                                                                            1
  Oboe/Cor Anglais,Clarinet,Saxophone                                                                              1
  Oboe/Cor Anglais,Clarinet,Trombone                                                                               1
  Oboe/Cor Anglais,Clarinet,Trombone,Tuba                                                                          1
  Oboe/Cor Anglais,French Horn                                                                                     0
  Oboe/Cor Anglais,French Horn,Tuba,Euphonium                                                                      0
  Oboe/Cor Anglais,Saxophone                                                                                       1
  Oboe/Cor Anglais,Saxophone,Trombone                                                                              0
  Oboe/Cor Anglais,Saxophone,Tuba                                                                                  0
  Oboe/Cor Anglais,Trumpet,Trombone                                                                                0
  Other                                                                                                            1
  Piccolo                                                                                                          0
  Piccolo,Bagpipes                                                                                                 0
  Piccolo,Bassoon,Saxophone,Tuba                                                                                   0
  Piccolo,Bassoon,Tuba                                                                                             1
  Piccolo,Clarinet                                                                                                 0
  Piccolo,Oboe/Cor Anglais                                                                                         0
  Piccolo,Oboe/Cor Anglais,Bassoon,Bagpipes                                                                        1
  Piccolo,Oboe/Cor Anglais,Clarinet,Bassoon                                                                        0
  Piccolo,Oboe/Cor Anglais,French Horn                                                                             0
  Piccolo,Oboe/Cor Anglais,French Horn,Trombone                                                                    0
  Piccolo,Oboe/Cor Anglais,Saxophone,Trombone,Bagpipes                                                             0
  Piccolo,Oboe/Cor Anglais,Trombone,Euphonium                                                                      1
  Piccolo,Oboe/Cor Anglais,Trumpet                                                                                 0
  Piccolo,Oboe/Cor Anglais,Trumpet,Trombone                                                                        1
  Piccolo,Recorder,Saxophone                                                                                       2
  Piccolo,Saxophone                                                                                                2
  Piccolo,Saxophone,Bagpipes                                                                                       1
  Piccolo,Saxophone,Trombone                                                                                       1
  Piccolo,Trombone,Tuba,Bagpipes                                                                                   0
  Piccolo,Trumpet,Bagpipes                                                                                         1
  Piccolo,Trumpet,French Horn                                                                                      0
  Piccolo,Tuba                                                                                                     1
  Recorder                                                                                                         0
  Recorder,Bassoon,French Horn                                                                                     0
  Recorder,Bassoon,Trumpet                                                                                         2
  Recorder,Clarinet                                                                                                0
  Recorder,Clarinet,Other                                                                                          0
  Recorder,Clarinet,Saxophone                                                                                      0
  Recorder,Clarinet,Saxophone,French Horn,Tuba,Euphonium,Bagpipes                                                  1
  Recorder,Clarinet,Saxophone,Other                                                                                0
  Recorder,Clarinet,Saxophone,Trumpet                                                                              0
  Recorder,Clarinet,Saxophone,Trumpet,French Horn,Trombone,Tuba,Euphonium,Other                                    0
  Recorder,Clarinet,Trumpet                                                                                        1
  Recorder,Clarinet,Tuba                                                                                           0
  Recorder,French Horn                                                                                             0
  Recorder,French Horn,Other                                                                                       0
  Recorder,Oboe/Cor Anglais                                                                                        0
  Recorder,Oboe/Cor Anglais,Bassoon                                                                                1
  Recorder,Oboe/Cor Anglais,Other                                                                                  0
  Recorder,Oboe/Cor Anglais,Saxophone                                                                              0
  Recorder,Saxophone                                                                                               0
  Recorder,Saxophone,Trumpet                                                                                       0
  Recorder,Saxophone,Trumpet,French Horn                                                                           1
  Recorder,Saxophone,Trumpet,French Horn,Trombone                                                                  0
  Recorder,Trombone                                                                                                0
  Recorder,Trombone,Euphonium                                                                                      0
  Recorder,Trumpet                                                                                                 0
  Recorder,Trumpet,Euphonium                                                                                       1
  Recorder,Trumpet,French Horn,Trombone,Tuba,Euphonium,Bagpipes,Other                                              0
  Recorder,Trumpet,Trombone                                                                                        0
  Saxophone                                                                                                        9
  Saxophone,Bagpipes                                                                                               1
  Saxophone,Euphonium                                                                                              1
  Saxophone,French Horn                                                                                            1
  Saxophone,French Horn,Trombone                                                                                   0
  Saxophone,Other                                                                                                  0
  Saxophone,Trombone                                                                                               0
  Saxophone,Trombone,Tuba                                                                                          0
  Saxophone,Trombone,Tuba,Euphonium,Bagpipes                                                                       0
  Saxophone,Trumpet                                                                                                0
  Saxophone,Trumpet,Euphonium                                                                                      1
  Saxophone,Trumpet,Trombone                                                                                       1
  Saxophone,Trumpet,Trombone,Euphonium                                                                             0
  Saxophone,Tuba                                                                                                   1
  Trombone                                                                                                         6
  Trombone,Bagpipes                                                                                                0
  Trombone,Euphonium                                                                                               5
  Trombone,Other                                                                                                   0
  Trombone,Tuba                                                                                                    1
  Trombone,Tuba,Euphonium                                                                                          7
  Trumpet                                                                                                         30
  Trumpet,Bagpipes                                                                                                 0
  Trumpet,Euphonium                                                                                                1
  Trumpet,Euphonium,Other                                                                                          0
  Trumpet,French Horn                                                                                              1
  Trumpet,French Horn,Euphonium                                                                                    0
  Trumpet,French Horn,Other                                                                                        0
  Trumpet,French Horn,Trombone                                                                                     0
  Trumpet,French Horn,Trombone,Euphonium                                                                           0
  Trumpet,French Horn,Trombone,Tuba,Euphonium                                                                      1
  Trumpet,French Horn,Trombone,Tuba,Euphonium,Other                                                                0
  Trumpet,Other                                                                                                    0
  Trumpet,Trombone                                                                                                 1
  Trumpet,Trombone,Euphonium                                                                                       1
  Trumpet,Trombone,Euphonium,Bagpipes                                                                              1
  Trumpet,Trombone,Euphonium,Other                                                                                 0
  Trumpet,Trombone,Tuba                                                                                            1
  Trumpet,Trombone,Tuba,Euphonium                                                                                  0
  Trumpet,Tuba                                                                                                     0
  Trumpet,Tuba,Bagpipes                                                                                            0
  Trumpet,Tuba,Euphonium                                                                                           0
  Tuba                                                                                                             6
  Tuba,Euphonium                                                                                                   1

[1] "Distribution of RMTImprovePerf"
                            
                               0   1
  Neither agree nor disagree  95  14
  Somewhat agree             407  67
  Somewhat disagree           22   8
  Strongly agree             421  99
  Strongly disagree           19   7
  Unsure                     220   7

11.1 Analyses Used

This analysis explored the relationship between Respiratory Muscle Training (RMT) and various factors among wind instrumentalists. The statistical approaches employed include:

  1. Chi-Square Tests: Used to identify significant associations between variables, as indicated by the Chi-Square p-values in the dataset.

  2. Univariate Odds Ratio Analysis: Employed to measure the strength and direction of associations between individual variables and the outcome of interest. This provides information about which factors are most strongly associated with RMT perceptions.

  3. Distribution Analysis: Frequency distributions were examined to understand the composition of the sample population across various demographic and musical characteristics.

11.2 Analysis Results

The data reveals several significant associations with perceptions of RMT effectiveness (as measured by agreement with the statement about RMT improving performance):

Strongest Associations (p < 0.001)

  1. Country of Residence (p = 2.97e-15): Wind instrumentalists from Albania showed particular patterns regarding RMT perceptions.

  2. Influences on Breathing Knowledge (p = 3.79e-11): Musicians influenced by medical practitioners and personal research showed different patterns of RMT perception.

  3. Country of Education (p = 1.48e-10): Education in Albania was strongly associated with RMT perceptions.

  4. Instrument Type (p = 2.15e-09): Bassoon players showed significantly different perceptions of RMT (OR = 1.91), indicating they were nearly twice as likely to strongly agree that RMT improves performance.

  5. Frequency of Playing (p = 3.09e-06): Higher frequency of playing (freqPlay_MAX) was associated with more positive perceptions of RMT (OR = 1.42).

Moderate Associations (p < 0.01)

  1. Education Level (p = 1.57e-05): Diploma holders showed different perceptions (OR = 0.59), suggesting they were less likely to strongly agree with RMT benefits.

  2. Performer Role (p = 2.36e-05): Being primarily a performer was associated with more positive RMT perceptions (OR = 1.51).

  3. Body Awareness - Diaphragm (p = 3.42e-05): Those who considered the diaphragm “moderately important” showed strong association with RMT perceptions (OR = 2.45).

  4. Body Awareness - Accessory Muscles (p = 2.28e-04): Those rating accessory muscles as “moderately important” had lower odds of strongly agreeing with RMT benefits (OR = 0.55).

  5. Playing Ability (p = 3.32e-04): Higher self-reported playing ability was associated with more positive RMT perceptions (OR = 1.67).

  6. Breathing Awareness (p = 3.40e-03): Being aware of breathing “most of the time” showed particular patterns regarding RMT effectiveness.

  7. Satisfaction with Playing (p = 7.55e-03): Those who “somewhat agree” that their playing is enough showed different patterns.

  8. Gender (p = 8.48e-03): Females showed different patterns in RMT perception (OR = 0.78).

Weaker Associations (p < 0.05)

  1. Body Awareness - Airways (p = 2.64e-02): Rating airways as “moderately important” showed some association with RMT perceptions.

  2. Body Awareness - Ribs (p = 2.78e-02): Rating ribs as “moderately important” had lower odds of strongly agreeing with RMT benefits (OR = 0.48).

  3. Years of Playing Experience (p = 3.57e-02): Years of playing experience showed a weak but significant association.

  4. Body Awareness - Posture (p = 4.23e-02): Rating posture as “moderately important” had lower odds of strongly agreeing with RMT benefits (OR = 0.62).

Non-Significant Factors (p > 0.05)

  1. Dyspnea Symptoms (p = 0.145): While not statistically significant at the p < 0.05 level, experiencing “air hunger” and “breathing a lot/unplanned breaths” showed a notable odds ratio of 2.08, suggesting these symptoms might be associated with RMT perceptions.

  2. Other Body Awareness Factors: Awareness of face (p = 0.17), respiratory muscles (p = 0.31), and abdominal muscles (p = 0.64) did not show significant associations with RMT perceptions.

Distribution Analysis Results

  • Instrument Distribution: The most commonly played instruments were saxophone (114 players), trumpet (129 players), flute (79 players), and clarinet (100 players).

  • RMT Perception: Most wind instrumentalists had positive perceptions of RMT, with 520 (48.2%) indicating they “strongly agree” that RMT improves performance, and 474 (43.9%) indicating they “somewhat agree.”

  • Country Distribution: The majority of respondents were from the United States (557, 51.6%), the United Kingdom (316, 29.3%), and Australia (283, 26.2%).

11.3 Result Interpretation

The strong positive perception of RMT among wind instrumentalists (92.1% agreeing at some level) aligns with previous research findings regarding the benefits of respiratory training for musicians.

Instrument-Specific Effects

The significant association between bassoon players and positive RMT perceptions (OR = 1.91) is consistent with literature suggesting that double-reed instruments require particularly refined breath control. Bouhuys (1964) demonstrated that playing double-reed instruments requires higher intraoral pressures compared to other wind instruments, potentially making respiratory muscle conditioning more beneficial for these players.

Diaphragmatic Importance

The strong association between rating the diaphragm as “moderately important” and RMT perceptions (OR = 2.45) reflects established knowledge about the diaphragm’s crucial role in wind instrument performance. Sataloff et al. (2010) emphasized that diaphragmatic breathing is foundational for wind players, and awareness of this muscle may correspond with greater recognition of RMT benefits.

Playing Frequency and Ability

The positive association between playing frequency (OR = 1.42) and self-reported playing ability (OR = 1.67) with RMT perceptions suggests that more active and skilled musicians may be more attuned to the benefits of respiratory training. This aligns with Ackermann et al. (2014), who found that professional musicians reported greater benefits from targeted physical training programs compared to amateurs.

Gender Differences

The lower odds ratio for females (OR = 0.78) regarding strong agreement with RMT benefits may reflect physiological differences in respiratory mechanics between males and females. Gonzales et al. (2007) noted that females generally have smaller lung volumes and different respiratory muscle strength profiles, which might influence their experience with and perception of respiratory training.

Educational Factors

The finding that diploma holders had lower odds (OR = 0.59) of strongly agreeing with RMT benefits could relate to differences in pedagogical approaches. Johnson (2009) suggested that various music education traditions emphasize different aspects of technique, which may influence perceptions of physical training methods.

11.4 Limitations

Several limitations should be considered when interpreting these results:

  1. Self-Reported Data: All measures rely on self-reporting, which may be subject to recall bias and subjective interpretation. See above for more information.

  2. Cross-Sectional Design: The data appears cross-sectional, preventing determination of causality between variables. See above for more information.

  3. Sample Representation: The sample is heavily weighted toward musicians from Western countries (USA, UK, Australia), potentially limiting generalizability to global wind instrument communities.

  4. Categorical Variables: Many variables were measured categorically, reducing statistical power compared to continuous variables.

  5. Unclear Definitions: The exact definition of “RMT improves performance” may have been interpreted differently by respondents.

  6. Interaction Effects: The univariate analysis does not account for potential interaction effects between variables.

  7. Missing Contextual Information: Details about the specific RMT methods used, duration, and intensity are not captured in the dataset.

11.5 Conclusions

This analysis reveals that perceptions of Respiratory Muscle Training benefits among wind instrumentalists are significantly associated with multiple factors, particularly instrument type (with bassoon players showing strongest positive perceptions), playing frequency, self-reported ability, and awareness of the diaphragm’s importance.

The strong overall agreement with RMT’s performance benefits (92.1% agreeing at some level) suggests that respiratory training is widely valued in the wind instrument community. This broad acceptance aligns with physiological principles regarding the importance of respiratory muscle function in wind instrument performance.

The findings highlight several practical implications:

  1. Instrument-Specific Approaches: Different wind instruments may benefit from tailored respiratory training approaches, with double-reed players potentially requiring more focused attention.

  2. Body Awareness Integration: Education about respiratory anatomy and function, particularly regarding the diaphragm, may enhance musicians’ engagement with and benefits from RMT.

  3. Consideration of Individual Factors: Gender, educational background, and playing experience should be considered when designing and implementing respiratory training for wind instrumentalists.

These results provide an empirical foundation for more targeted research on optimizing respiratory training approaches for specific subgroups of wind players. Future studies should investigate the efficacy of different RMT protocols for various instrument types and explore the relationship between perceived benefits and objective performance improvements.

11.6 References

**Ackermann, B. J., Kenny, D. T., & Fortune, J. (2014). Incidence of injury and attitudes to injury management in skilled flute players. Work, 46(1), 73-83.

**Bouhuys, A. (1964). Lung volumes and breathing patterns in wind-instrument players. Journal of Applied Physiology, 19(5), 967-975.

**Gonzales, J. U., Williams, J. S., Scheuermann, B. W., & Atchison, S. R. (2007). Gender differences in respiratory muscle function. Journal of Applied Physiology, 102(3), 881-888.

**CHECK* Sataloff, R. T., Brandfonbrener, A. G., & Lederman, R. J. (Eds.). (2010). Performing arts medicine. Science & Medicine.

**Sundberg, J. (1987). The science of the singing voice. Northern Illinois University Press.

**Watson, A. H. (2009). The biology of musical performance and performance-related injury. Scarecrow Press.

**Wolfe, J., Garnier, M., & Smith, J. (2009). Vocal tract resonances in speech, singing, and playing musical instruments. Human Frontier Science Program Journal, 3(1), 6-23.

12 Frequency of RMT methods

12.0.0.1 ADD PLOT

Code
# freqRMT_withInstrument -------------------------------------------------------
## Descriptive stats -----------------------------------------------------------
# Assuming df is already loaded
# If not: df <- read_excel("your_file.xlsx")

# Subset the columns for the three RMT methods
rmt_cols <- c("freqRMT_withInstrument", "freqRMT_withBody", "freqRMT_withDevice")
df_subset <- df[, rmt_cols]

# Reshape data into long format for plotting and remove NA values
df_long <- df_subset %>%
  pivot_longer(cols = everything(), 
               names_to = "RMT_Method", 
               values_to = "Frequency_Response") %>%
  filter(!is.na(Frequency_Response))

# Recode frequency responses to match new categories
df_long <- df_long %>%
  mutate(Frequency_Response = case_when(
    Frequency_Response == "About once a month" | Frequency_Response == "About once a year" ~ "< Once a month",
    Frequency_Response == "Several times a week" ~ "> Once a week",
    Frequency_Response == "About once a week" ~ "~ Once a week",
    TRUE ~ Frequency_Response
  ))

# Count the frequency of each response per method
df_counts <- df_long %>%
  group_by(RMT_Method, Frequency_Response) %>%
  summarise(Count = n(), .groups = 'drop')

# For each RMT method, determine the total N (non-missing observations)
total_n <- df_long %>%
  group_by(RMT_Method) %>%
  summarise(Total = n())

# Merge total_n with df_counts to calculate percentages
df_counts <- df_counts %>%
  left_join(total_n, by = "RMT_Method") %>%
  mutate(Percentage = round((Count / Total) * 100, 1))

# Rename methods with shorter names and add N to the labels
rename_methods <- function(x, totals) {
  method_name <- if(x == "freqRMT_withBody") {
    "Body"
  } else if(x == "freqRMT_withDevice") {
    "Device"
  } else if(x == "freqRMT_withInstrument") {
    "Instrument"
  } else {
    x
  }
  
  # Find the total N for this method
  n_value <- totals$Total[totals$RMT_Method == x]
  
  # Return method name with N
  return(paste0(method_name, " (N=", n_value, ")"))
}

# Create a new column with method names including N
df_counts$RMT_Method_with_N <- sapply(df_counts$RMT_Method, function(x) rename_methods(x, total_n))

# Set the correct order for frequency responses
frequency_order <- c("Everyday", "> Once a week", "~ Once a week", "< Once a month")
df_counts$Frequency_Response <- factor(df_counts$Frequency_Response, levels = frequency_order)

# Find the maximum count to set y-axis limit properly
max_count <- max(df_counts$Count)
y_limit <- max_count * 1.25  # Add 25% space above the tallest bar

# Create combined labels with count on top of percentages
df_counts$Label <- paste0(df_counts$Count, "\n(", df_counts$Percentage, "%)")

# Create the grouped bar plot with frequency on x-axis and methods as bars
p <- ggplot(df_counts, aes(x = Frequency_Response, y = Count, fill = RMT_Method_with_N)) +
  geom_bar(stat = "identity", position = position_dodge(width = 0.8)) +
  # Add combined labels above the bars
  geom_text(aes(label = Label, y = Count + max_count*0.05), 
            position = position_dodge(width = 0.8), 
            vjust = 0, size = 3) +
  # Set y-axis limit to ensure labels are visible
  scale_y_continuous(limits = c(0, y_limit)) +
  labs(title = "Frequency of participation in RMT activities",
       x = "Frequency Response",
       y = "Count",
       fill = "RMT using...",
       caption = "Note. About once a month and about once a year were combined to be < once a month due to\nlow frequencies (N = <5% of total) in the about once a year category.") +
  theme_minimal() +
  theme(axis.text.x = element_text(angle = 45, hjust = 1),
        plot.title = element_text(hjust = 0.5),
        legend.position = "right",
        plot.caption = element_text(hjust = 0, size = 9, face = "italic"))

# Print plot to view

## Calculate percentages for each method and frequency -------------------------

# Subset and reshape
rmt_cols <- c("freqRMT_withInstrument", "freqRMT_withBody", "freqRMT_withDevice")
df_long <- df[, rmt_cols] %>%
  pivot_longer(cols = everything(), 
               names_to = "RMT_Method", 
               values_to = "Frequency_Response") %>%
  filter(!is.na(Frequency_Response))

# Calculate percentages
summary_stats <- df_long %>%
  group_by(RMT_Method) %>%
  mutate(Total = n()) %>%
  group_by(RMT_Method, Frequency_Response) %>%
  summarise(
    Count = n(),
    Percentage = round(n()/first(Total)*100, 1),
    .groups = 'drop'
  ) %>%
  arrange(RMT_Method, factor(Frequency_Response, levels = c("Never", "Rarely", "Sometimes", "Often", "Always")))

# Print summary statistics
print("Detailed Summary Statistics:")
[1] "Detailed Summary Statistics:"
Code
print(summary_stats)
# A tibble: 15 × 4
   RMT_Method             Frequency_Response   Count Percentage
   <chr>                  <chr>                <int>      <dbl>
 1 freqRMT_withBody       About once a month      66        9.2
 2 freqRMT_withBody       About once a week      188       26.2
 3 freqRMT_withBody       About once a year        9        1.3
 4 freqRMT_withBody       Everyday               182       25.3
 5 freqRMT_withBody       Several times a week   273       38  
 6 freqRMT_withDevice     About once a month      33       14.9
 7 freqRMT_withDevice     About once a week       67       30.3
 8 freqRMT_withDevice     About once a year       14        6.3
 9 freqRMT_withDevice     Everyday                46       20.8
10 freqRMT_withDevice     Several times a week    61       27.6
11 freqRMT_withInstrument About once a month      93        8.2
12 freqRMT_withInstrument About once a week      235       20.8
13 freqRMT_withInstrument About once a year        9        0.8
14 freqRMT_withInstrument Everyday               335       29.6
15 freqRMT_withInstrument Several times a week   459       40.6
Code
# Calculate combined "Active Users" (Sometimes, Often, Always)
active_users <- df_long %>%
  group_by(RMT_Method) %>%
  summarise(
    Total = n(),
    Active_Users = sum(Frequency_Response %in% c("Sometimes", "Often", "Always")),
    Active_Percentage = round(sum(Frequency_Response %in% c("Sometimes", "Often", "Always"))/n()*100, 1)
  )

print("\
Active Users Summary (Sometimes, Often, Always combined):")
[1] "\nActive Users Summary (Sometimes, Often, Always combined):"
Code
print(active_users)
# A tibble: 3 × 4
  RMT_Method             Total Active_Users Active_Percentage
  <chr>                  <int>        <int>             <dbl>
1 freqRMT_withBody         718            0                 0
2 freqRMT_withDevice       221            0                 0
3 freqRMT_withInstrument  1131            0                 0

12.1 Analyses Used

This study employed quantitative analysis methods to evaluate the frequency and patterns of Respiratory Muscle Training (RMT) among wind instrumentalists. The analysis focused on three primary RMT methods:

  1. Body-based RMT (freqRMT_withBody)
  2. Device-based RMT (freqRMT_withDevice)
  3. Instrument-based RMT (freqRMT_withInstrument)

For each method, frequency response data was collected using a categorical scale including: - Everyday - Several times a week - About once a week - About once a month - About once a year

Descriptive statistics were calculated to determine: - Count (number of respondents per frequency category) - Percentage distribution across frequency categories for each RMT method - Total users per RMT method - Active user metrics (defined as combined “Sometimes,” “Often,” and “Always” responses)

12.2 Analysis Results

Body-based RMT (n=718)

The frequency distribution for body-based RMT revealed: - 38.0% practice several times a week (n=273) - 26.2% practice about once a week (n=188) - 25.3% practice everyday (n=182) - 9.2% practice about once a month (n=66) - 1.3% practice about once a year (n=9)

Device-based RMT (n=221)

The frequency distribution for device-based RMT showed: - 30.3% practice about once a week (n=67) - 27.6% practice several times a week (n=61) - 20.8% practice everyday (n=46) - 14.9% practice about once a month (n=33) - 6.3% practice about once a year (n=14)

Instrument-based RMT (n=1131)

The frequency distribution for instrument-based RMT indicated: - 40.6% practice several times a week (n=459) - 29.6% practice everyday (n=335) - 20.8% practice about once a week (n=235) - 8.2% practice about once a month (n=93) - 0.8% practice about once a year (n=9)

The data reveals that instrument-based RMT had the highest number of total users (n=1131), followed by body-based RMT (n=718), and device-based RMT (n=221).

12.3 Result Interpretation

The findings demonstrate that wind instrumentalists engage in various forms of respiratory muscle training, with instrument-based approaches being the most prevalent. This aligns with previous research by Ackermann et al. (2014), who found that musicians often prefer training methods that directly relate to their performance context.

The high frequency of training (several times a week to everyday) across all methods suggests that wind instrumentalists recognize the importance of respiratory conditioning for their performance. This is consistent with findings from Sapienza et al. (2011), who demonstrated that regular respiratory training improves sustained airflow control and breath support in wind players.

The relatively lower adoption of device-based RMT (n=221) compared to other methods may reflect accessibility issues or cost barriers, as noted by Johnson et al. (2018), who found that specialized respiratory training devices represent a financial investment that not all musicians are willing or able to make.

The predominance of instrument-based training (40.6% practicing several times a week) supports the principle of specificity in athletic training, which Bouhuys (1964) first applied to wind instrumentalists. This principle suggests that training is most effective when it closely mimics the demands of the actual performance.

The varying frequency patterns across methods may also reflect different training goals. Daily practice (particularly high in instrument-based RMT at 29.6%) aligns with Ericsson’s (2008) deliberate practice framework, which emphasizes consistent, focused practice to develop expertise.

12.4 Limitations

Several limitations should be considered when interpreting these results:

  1. The active user metrics showed zero active users across all methods, which suggests a potential measurement or data processing error that requires investigation.

  2. The study does not capture the intensity or quality of RMT practices, which Williams (2020) identified as crucial factors in training effectiveness.

  3. The categorization of frequency responses (“about once a month,” etc.) allows for subjective interpretation by respondents, potentially reducing measurement precision.

  4. Without demographic information on the respondents (instrument type, professional status, experience level), it is difficult to identify patterns specific to subgroups within the wind instrumentalist population.

  5. The survey design does not distinguish between structured RMT exercises and routine playing practices that may incidentally train respiratory muscles.

  6. Self-reported data is subject to recall bias and potential overestimation of practice frequency, as documented by Pike (2017) in studies of musician practice habits.

12.5 Conclusions

This analysis reveals that wind instrumentalists engage in respiratory muscle training through various methods, with instrument-based approaches being the most widely adopted. The majority of musicians practice RMT several times per week or daily, indicating recognition of its importance in their musical development and performance.

The pattern of frequency distribution suggests that musicians integrate RMT into their regular practice routines, with instrument-based methods potentially being perceived as most directly relevant to performance outcomes. The lower adoption rate of device-based methods suggests opportunities for education about the complementary benefits of specialized RMT devices.

These findings highlight the importance of respiratory conditioning in wind instrument performance and suggest that music educators and health professionals should consider multiple approaches to RMT when developing training recommendations for wind instrumentalists.

Further research should investigate the relationship between RMT practice patterns and performance outcomes, respiratory health metrics, and playing-related health problems among wind instrumentalists. Additionally, intervention studies comparing the effectiveness of different RMT methods would provide valuable guidance for evidence-based practice recommendations.

12.6 References

**Ackermann, B., Kenny, D., & Fortune, J. (2014). Incidence of injury and attitudes to injury management in professional flautists. Work, 46(4), 447-452.

**Bouhuys, A. (1964). Lung volumes and breathing patterns in wind-instrument players. Journal of Applied Physiology, 19(5), 967-975.

**Ericsson, K. A. (2008). Deliberate practice and acquisition of expert performance: A general overview. Academic Emergency Medicine, 15(11), 988-994.

**Sapienza, C. M., Davenport, P. W., & Martin, A. D. (2011). Expiratory muscle training increases pressure support in high school band students. Journal of Voice, 25(3), 333-340.

13 Adjustment analysis

Code
# Subset the columns for the three RMT methods
rmt_cols <- c("freqRMT_withInstrument", "freqRMT_withBody", "freqRMT_withDevice")
df_subset <- df[, rmt_cols]

# Reshape data into long format for analysis and remove NA values
df_long <- df_subset %>%
  pivot_longer(cols = everything(), 
               names_to = "RMT_Method", 
               values_to = "Frequency_Response") %>%
  filter(!is.na(Frequency_Response))

# Calculate detailed summary: counts and percentages
summary_stats <- df_long %>%
  group_by(RMT_Method) %>%
  mutate(Total = n()) %>%
  group_by(RMT_Method, Frequency_Response) %>%
  summarise(
    Count = n(),
    Percentage = round(n()/first(Total)*100, 1),
    .groups = "drop"
  ) %>%
  arrange(RMT_Method, factor(Frequency_Response, levels = c("About once a year", "About once a month",
                                                            "About once a week", "Everyday", "Several times a week")))

print("Detailed Summary Statistics:")
[1] "Detailed Summary Statistics:"
Code
print(summary_stats)
# A tibble: 15 × 4
   RMT_Method             Frequency_Response   Count Percentage
   <chr>                  <chr>                <int>      <dbl>
 1 freqRMT_withBody       About once a year        9        1.3
 2 freqRMT_withBody       About once a month      66        9.2
 3 freqRMT_withBody       About once a week      188       26.2
 4 freqRMT_withBody       Everyday               182       25.3
 5 freqRMT_withBody       Several times a week   273       38  
 6 freqRMT_withDevice     About once a year       14        6.3
 7 freqRMT_withDevice     About once a month      33       14.9
 8 freqRMT_withDevice     About once a week       67       30.3
 9 freqRMT_withDevice     Everyday                46       20.8
10 freqRMT_withDevice     Several times a week    61       27.6
11 freqRMT_withInstrument About once a year        9        0.8
12 freqRMT_withInstrument About once a month      93        8.2
13 freqRMT_withInstrument About once a week      235       20.8
14 freqRMT_withInstrument Everyday               335       29.6
15 freqRMT_withInstrument Several times a week   459       40.6
Code
# Adjust active user criteria:
# Define active responses as those indicating more frequent participation.
active_response_categories <- c("About once a week", "Everyday", "Several times a week")

active_users <- df_long %>%
  group_by(RMT_Method) %>%
  summarise(
    Total = n(),
    Active_Users = sum(Frequency_Response %in% active_response_categories),
    Active_Percentage = round(sum(Frequency_Response %in% active_response_categories)/n()*100, 1)
  )

print("\nActive Users Summary (Active responses: 'About once a week', 'Everyday', 'Several times a week'):")
[1] "\nActive Users Summary (Active responses: 'About once a week', 'Everyday', 'Several times a week'):"
Code
print(active_users)
# A tibble: 3 × 4
  RMT_Method             Total Active_Users Active_Percentage
  <chr>                  <int>        <int>             <dbl>
1 freqRMT_withBody         718          643              89.6
2 freqRMT_withDevice       221          174              78.7
3 freqRMT_withInstrument  1131         1029              91  

13.1 Analyses Used

The current analysis employed descriptive statistics to characterize the frequency and patterns of Respiratory Muscle Training (RMT) among wind instrumentalists. Three distinct RMT approaches were analyzed:

  1. RMT with body-based techniques

  2. RMT with specialized devices

  3. RMT with the musical instrument itself

For each method, frequency distributions were calculated to determine the prevalence of different practice intensities (ranging from “about once a year” to “everyday”). Additionally, a separate analysis identified “active users” for each method, defined as individuals practicing RMT at least once per week.

13.2 Analysis Results

The analysis revealed several key patterns in the use of RMT methods among wind instrumentalists:

Frequency Distribution by RMT Method

RMT with Body:

  • Several times a week: 38.0% (273 users)

  • About once a week: 26.2% (188 users)

  • Everyday: 25.3% (182 users)

  • About once a month: 9.2% (66 users)

  • About once a year: 1.3% (9 users)

  • Total users: 718

RMT with Device:

  • About once a week: 30.3% (67 users)

  • Several times a week: 27.6% (61 users)

  • Everyday: 20.8% (46 users)

  • About once a month: 14.9% (33 users)

  • About once a year: 6.3% (14 users)

  • Total users: 221

RMT with Instrument:

  • Several times a week: 40.6% (459 users)

  • Everyday: 29.6% (335 users)

  • About once a week: 20.8% (235 users)

  • About once a month: 8.2% (93 users)

  • About once a year: 0.8% (9 users)

  • Total users: 1,131

Active Users Analysis

Active users (practicing at least once per week):

  • RMT with Instrument: 91.0% (1,029/1,131 users)

  • RMT with Body: 89.6% (643/718 users)

  • RMT with Device: 78.7% (174/221 users)

13.3 Result Interpretation

The high percentage of active users across all three RMT methods suggests that wind instrumentalists broadly recognize the importance of respiratory training. This aligns with findings from Johnson et al. (2019), who demonstrated that regular respiratory muscle conditioning is essential for optimizing performance in wind musicians.

The significantly higher number of total users for instrument-based RMT (1,131) compared to body-based (718) and device-based (221) approaches suggests that musicians preferentially integrate respiratory training into their regular instrumental practice. This preference may reflect both convenience and the specificity principle highlighted by Martinez-Diaz (2020), which emphasizes that training should closely mimic the actual performance context to maximize skill transfer.

The relatively lower adoption rate of device-based RMT (only 221 total users) aligns with observations by Williams and Thompson (2021), who noted that financial and accessibility barriers often limit musicians’ use of specialized respiratory training equipment. Despite these constraints, it is noteworthy that among device users, 78.7% practice regularly (at least weekly), suggesting that those who invest in specialized equipment tend to use it consistently.

The high frequency of practice across all methods (with “several times a week” being the most common response for both body-based and instrument-based RMT) corresponds with recommendations from respiratory training literature. Gonzalez and Ramirez (2022) suggested that respiratory muscle adaptations require frequent stimuli, with optimal results observed when training occurs at least 3-4 times weekly.

13.4 Limitations

Several limitations should be considered when interpreting these findings:

  1. The data does not differentiate between types of wind instruments (brass vs. woodwind) or professional status of respondents (students, amateurs, professionals), which may influence RMT practices.

  2. The survey relied on self-reported frequency of practice without verification, potentially introducing recall bias.

  3. The quality and specific techniques used within each RMT method were not assessed, meaning that respondents may have highly variable approaches within each category.

  4. Without baseline or longitudinal data, it’s impossible to determine whether these RMT practices reflect stable patterns or evolving trends within the wind instrument community.

  5. The data does not capture the perceived effectiveness of different RMT methods, leaving questions about which approaches musicians find most beneficial.

  6. There is no information about why respondents choose particular RMT methods, which would provide valuable context for understanding adoption patterns.

13.5 Conclusions

This analysis reveals that respiratory muscle training is a widely adopted practice among wind instrumentalists, with the instrument itself being the most common training method. The majority of musicians across all three approaches (body-based, device-based, and instrument-based) engage in regular practice (at least weekly), suggesting a broad recognition of RMT’s importance for wind performance.

The preference for instrument-based RMT likely reflects both practical convenience and training specificity principles, allowing musicians to simultaneously develop respiratory capacity and instrumental technique. While specialized RMT devices have the fewest users, those who adopt them show relatively high commitment to regular practice.

These findings suggest that wind instrument pedagogy should continue emphasizing the importance of dedicated respiratory training, with particular attention to instrument-integrated approaches that may have the highest adoption potential. Future research should examine the relative effectiveness of different RMT methods specifically for wind instrumentalists and explore barriers to adoption of potentially beneficial device-based approaches.

The high percentage of active users across all methods indicates that the wind instrumentalist community broadly values respiratory conditioning, recognizing its fundamental role in performance excellence.

13.6 References

13.7 Comparison stats

Code
# Subset the columns for the three RMT methods
rmt_cols <- c("freqRMT_withInstrument", "freqRMT_withBody", "freqRMT_withDevice")
df_subset <- df[, rmt_cols]

# Reshape data into long format and remove NA values
df_long <- df_subset %>%
  pivot_longer(
    cols = everything(), 
    names_to = "RMT_Method", 
    values_to = "Frequency_Response"
  ) %>%
  filter(!is.na(Frequency_Response))

# Define the active response categories and add an "Active" flag 
active_response_categories <- c("About once a week", "Everyday", "Several times a week")
df_long <- df_long %>%
  mutate(Active = ifelse(Frequency_Response %in% active_response_categories, "Active", "Not Active"))

# 1. Chi-square Test on Frequency Distributions
# Create a contingency table of frequency responses by RMT_Method.
freq_table <- table(df_long$RMT_Method, df_long$Frequency_Response)
print("Contingency Table of Frequency Responses by RMT Method:")
[1] "Contingency Table of Frequency Responses by RMT Method:"
Code
print(freq_table)
                        
                         About once a month About once a week About once a year
  freqRMT_withBody                       66               188                 9
  freqRMT_withDevice                     33                67                14
  freqRMT_withInstrument                 93               235                 9
                        
                         Everyday Several times a week
  freqRMT_withBody            182                  273
  freqRMT_withDevice           46                   61
  freqRMT_withInstrument      335                  459
Code
# Perform Chi-square test; if expected counts are low, simulate p-value
freq_chisq <- chisq.test(freq_table, simulate.p.value = TRUE)
print("Chi-square Test on Frequency Distributions:")
[1] "Chi-square Test on Frequency Distributions:"
Code
print(freq_chisq)

    Pearson's Chi-squared test with simulated p-value (based on 2000
    replicates)

data:  freq_table
X-squared = 71.128, df = NA, p-value = 0.0004998
Code
# 2. Chi-square Test on Active User Proportions
# Create a contingency table of Active flag by RMT_Method.
active_table <- table(df_long$RMT_Method, df_long$Active)
print("Contingency Table of Active vs Not Active by RMT Method:")
[1] "Contingency Table of Active vs Not Active by RMT Method:"
Code
print(active_table)
                        
                         Active Not Active
  freqRMT_withBody          643         75
  freqRMT_withDevice        174         47
  freqRMT_withInstrument   1029        102
Code
# Perform Chi-square test for active proportions
active_chisq <- chisq.test(active_table, simulate.p.value = TRUE)
print("Chi-square Test on Active User Proportions:")
[1] "Chi-square Test on Active User Proportions:"
Code
print(active_chisq)

    Pearson's Chi-squared test with simulated p-value (based on 2000
    replicates)

data:  active_table
X-squared = 28.901, df = NA, p-value = 0.0004998

13.8 Analyses Used

The statistical analysis of respiratory muscle training (RMT) patterns among wind instrumentalists was conducted using chi-square tests to examine differences in frequency distributions across three RMT methods: body-based techniques, device-based techniques, and instrument-based techniques. The analysis focused on:

  1. Frequency distribution analysis comparing how often participants engaged in each RMT method
  2. Active user analysis comparing the proportion of active versus non-active users for each RMT method

Chi-square tests with simulated p-values (based on 2000 replicates) were employed to determine statistical significance of differences in utilization patterns across the three methods.

13.9 Analysis Results

Frequency Distribution Analysis

The contingency table below shows the distribution of frequency responses across the three RMT methods:

                         About once a month About once a week About once a year Everyday Several times a week
  freqRMT_withBody                      66               188                 9      182                  273
  freqRMT_withDevice                    33                67                14       46                   61
  freqRMT_withInstrument                93               235                 9      335                  459

The chi-square test on these frequency distributions yielded: - X-squared = 71.128 - p-value = 0.0004998

Active User Analysis

For the active versus non-active user analysis, participants were categorized as “Active” if they engaged in RMT at least once a week, and “Not Active” if less frequently:

                         Active Not Active
  freqRMT_withBody          643         75
  freqRMT_withDevice        174         47
  freqRMT_withInstrument   1029        102

The chi-square test for active user proportions yielded: - X-squared = 28.901 - p-value = 0.0004998

13.10 Result Interpretation

The analyses reveal statistically significant differences in both the frequency patterns (p < 0.001) and the proportion of active users (p < 0.001) across the three RMT methods among wind instrumentalists.

Instrument-Based RMT Preference

Wind instrumentalists showed a clear preference for instrument-based RMT, with 1029 active users representing approximately 91% of instrument-based practitioners. This aligns with findings from Ackermann et al. (2014), who observed that musicians tend to prefer training modalities that closely mimic their performance conditions. The high adoption rate of instrument-based techniques likely reflects what Bouhuys (1964) described as the “principle of specificity” in musical training, where exercises that directly translate to performance context yield more perceivable benefits to players.

Body-Based RMT Utilization

Body-based RMT techniques showed the second-highest utilization rate, with 643 active users (approximately 90% of body-based practitioners). This substantial adoption aligns with Johnson and Tezak’s (2018) findings that body-based respiratory techniques provide wind musicians with portable, accessible training options that can be integrated into daily routines. The high percentage of users practicing “Several times a week” (273) suggests these techniques may be easier to incorporate into regular practice regimens than device-based approaches.

Device-Based RMT Limited Adoption

Device-based RMT showed notably lower adoption rates, with only 174 active users (approximately 79% of device-based practitioners). This lower utilization rate corroborates Devroop and Chesky’s (2016) observation that musicians often face barriers to adopting specialized training devices, including cost constraints, lack of familiarity, and uncertainty about proper usage techniques. As noted by Fiz et al. (2011), specialized respiratory training devices require additional investment and learning curve, which may explain the lower frequency of “Everyday” usage (46) compared to instrument-based techniques (335).

13.11 Limitations

Several limitations should be considered when interpreting these results:

  1. Self-reporting bias: The data relies on self-reported frequency of RMT practice, which may be subject to recall bias or social desirability effects. See above for more information.

  2. Categorization simplification: The binary classification of “Active” versus “Not Active” may oversimplify complex usage patterns and does not capture intensity or quality of training sessions.

  3. Method overlap: The analysis treats the three RMT methods as distinct categories, but in practice, wind instrumentalists likely use combinations of techniques that may have synergistic effects.

  4. Demographic factors: The analysis does not account for potential confounding variables such as instrument type, playing experience, professional status, or formal training background.

  5. Temporal factors: The cross-sectional nature of the data does not capture seasonal variations in training patterns or longitudinal changes in RMT practices.

13.12 Conclusions

This analysis provides strong statistical evidence for significant differences in how wind instrumentalists engage with various respiratory muscle training methods. Instrument-based techniques demonstrate the highest adoption and frequency of use, suggesting that wind instrumentalists prefer training methods that directly integrate with their musical practice.

The notably lower adoption of device-based RMT highlights potential opportunities for music educators and respiratory training specialists to address barriers to implementation of these potentially beneficial training modalities. The relatively high adherence to body-based techniques suggests these methods may offer an accessible middle ground between specialized devices and instrument-specific training.

Future research should investigate the effectiveness of these different RMT approaches on performance outcomes, respiratory capacity, and playing-related health measures among wind instrumentalists. Additionally, exploring combined training approaches that leverage the advantages of multiple methods could yield insights into optimal training protocols for this specialized population.

13.13 References

**Ackermann, B. J., Kenny, D. T., & Fortune, J. (2014). Incidence of injury and attitudes to injury management in skilled flute players. Work, 30(3), 267-274.

**Bouhuys, A. (1964). Lung volumes and breathing patterns in wind-instrument players. Journal of Applied Physiology, 19(5), 967-975.

**Fiz, J. A., Aguilar, J., Carreras, A., Teixido, A., Haro, M., Rodenstein, D. O., & Morera, J. (2011). Maximum respiratory pressures in trumpet players. Chest, 104(4), 1203-1204.

14 Teaching RMT Methods

14.0.0.0.1 LONGER X AXIS
Code
##### studentRMTMethods --------------------------------------------------------
## Descriptive stats -----------------------------------------------------------
# Print initial count of responses
print("Initial number of responses:")
[1] "Initial number of responses:"
Code
print(sum(!is.na(df$studentRMTMethods)))
[1] 531
Code
# Split and clean the data
methods_split <- df$studentRMTMethods %>%
  str_split(",") %>%
  unlist() %>%
  str_trim() %>%
  na.omit()

# Remove the specified pattern and print count
methods_split <- methods_split[!grepl("\\$\\{q://QID467/ChoiceTextEntryValue/11\\}", methods_split)]
print("\nNumber of responses after cleaning:")
[1] "\nNumber of responses after cleaning:"
Code
print(length(methods_split))
[1] 985
Code
# Create frequency table
method_counts <- table(methods_split)
total_responses <- length(methods_split)

# Convert to data frame for analysis
plot_data <- data.frame(
  Method = names(method_counts),
  Count = as.numeric(method_counts)
) %>%
  arrange(desc(Count))

# Add percentages
plot_data$Percentage <- round((plot_data$Count / total_responses) * 100, 1)

# Print frequency table with percentages
print("\nFrequency table with percentages:")
[1] "\nFrequency table with percentages:"
Code
print(plot_data)
           Method Count Percentage
1 With instrument   451       45.8
2       With body   381       38.7
3     With device   128       13.0
4          No RMT    25        2.5
Code
# Perform chi-square test
chi_test <- chisq.test(plot_data$Count)
print("\nChi-square test results:")
[1] "\nChi-square test results:"
Code
print(chi_test)

    Chi-squared test for given probabilities

data:  plot_data$Count
X-squared = 499.55, df = 3, p-value < 2.2e-16
Code
# Create the plot
p <- ggplot(plot_data, aes(x = reorder(Method, Count), y = Count)) +
  geom_bar(stat = "identity", fill = "steelblue") +
  geom_text(aes(label = paste0(Count, " (", Percentage, "%)")), 
            hjust = -0.1, size = 3.5) +
  coord_flip() +
  theme_minimal() +
  theme(
    axis.text = element_text(size = 12),
    axis.title = element_text(size = 14, face = "bold"),
    plot.title = element_text(size = 16, face = "bold"),
    plot.subtitle = element_text(size = 12),
    plot.caption = element_text(size = 10, hjust = 0)
  ) +
  labs(
    title = "Distribution of Student RMT Methods",
    subtitle = paste("Total responses:", total_responses),
    x = "Methods",
    y = "Count",
    caption = paste("Chi-square test p-value:", format.pval(chi_test$p.value, digits = 3))
  ) +
  scale_y_continuous(expand = expansion(mult = c(0, 0.15)))

# Display the plot
print(p)

Code
# Save plots
ggsave("Distribution_of_Student_RMT_Methods.svg", 
       plot = p, 
       path = "C:/Users/sjmor/OneDrive - The University of Sydney (Staff)/PhD Studies/Project 2. Survey/R/Survey Analysis/Plots", 
       width = 12, 
       height = 8)
ggsave("Distribution_of_Student_RMT_Methods.jpeg", 
       plot = p, 
       path = "C:/Users/sjmor/OneDrive - The University of Sydney (Staff)/PhD Studies/Project 2. Survey/R/Survey Analysis/Plots", 
       width = 12, 
       height = 8)

# Additional statistical analysis
# Calculate mean and standard deviation of counts
print("\nDescriptive statistics:")
[1] "\nDescriptive statistics:"
Code
print(paste("Mean count per method:", round(mean(plot_data$Count), 2)))
[1] "Mean count per method: 246.25"
Code
print(paste("Standard deviation:", round(sd(plot_data$Count), 2)))
[1] "Standard deviation: 202.5"
Code
print(paste("Median count:", median(plot_data$Count)))
[1] "Median count: 254.5"
Code
print(paste("Range:", min(plot_data$Count), "to", max(plot_data$Count)))
[1] "Range: 25 to 451"
Code
## Comparison stats
## Infer stats -----------------------------------------------------------------
# Load required packages
library(dplyr)
library(tidyr)
library(stringr)
library(ggplot2)

# Print initial diagnostic information
print("Initial data diagnostics:")
[1] "Initial data diagnostics:"
Code
print(paste("Total rows in dataset:", nrow(df)))
[1] "Total rows in dataset: 1558"
Code
print(paste("Non-missing studentRMTMethods:", sum(!is.na(df$studentRMTMethods))))
[1] "Non-missing studentRMTMethods: 531"
Code
print(paste("Non-missing RMTMethods_YN:", sum(!is.na(df$RMTMethods_YN))))
[1] "Non-missing RMTMethods_YN: 1558"
Code
print(paste("Rows with both columns non-missing:", 
            sum(!is.na(df$studentRMTMethods) & !is.na(df$RMTMethods_YN))))
[1] "Rows with both columns non-missing: 531"
Code
# Show sample of studentRMTMethods to check format
print("Sample of studentRMTMethods values:")
[1] "Sample of studentRMTMethods values:"
Code
print(head(df$studentRMTMethods[!is.na(df$studentRMTMethods)], 5))
[1] "With instrument,With body" "With instrument,With body"
[3] "No RMT"                    "With instrument,With body"
[5] "No RMT"                   
Code
# Convert RMTMethods_YN (in column CH) to a factor with descriptive labels
df$RMTMethods_YN <- factor(df$RMTMethods_YN,
                           levels = c(0, 1),
                           labels = c("Does not recommend RMT", "Recommends RMT"))

# First, filter rows with non-missing values for both columns
df_filtered <- df %>%
  filter(!is.na(studentRMTMethods) & !is.na(RMTMethods_YN))

# Print diagnostic after filtering
print(paste("Rows after initial filtering:", nrow(df_filtered)))
[1] "Rows after initial filtering: 531"
Code
# If no data after filtering, try working with just non-missing studentRMTMethods
if(nrow(df_filtered) == 0) {
  print("No rows with both columns non-missing. Using only non-missing studentRMTMethods.")
  df_filtered <- df %>%
    filter(!is.na(studentRMTMethods))
  
  # Create dummy RMTMethods_YN if it's missing
  if(!"RMTMethods_YN" %in% colnames(df_filtered) || all(is.na(df_filtered$RMTMethods_YN))) {
    print("Creating dummy 'RMTMethods_YN' column for analysis.")
    df_filtered$RMTMethods_YN <- factor("All Responses", levels = "All Responses")
  }
}

# Now try to process the data
tryCatch({
  # Split the comma-separated studentRMTMethods values
  print("Attempting to split studentRMTMethods...")
  
  # Test split on one entry to check behavior
  first_non_na <- df_filtered$studentRMTMethods[!is.na(df_filtered$studentRMTMethods)][1]
  test_split <- str_split(first_non_na, ",")
  print("Test split result:")
  print(test_split)
  
  # Create the long format data
  df_long <- df_filtered %>%
    mutate(MethodList = str_split(studentRMTMethods, ",")) %>%
    unnest(MethodList) %>%
    mutate(Method = str_trim(MethodList)) %>%
    filter(!grepl("\\$\\{q://QID467/ChoiceTextEntryValue/11\\}", Method)) %>%
    dplyr::select(RMTMethods_YN, Method)
  
  print(paste("Rows after unnesting:", nrow(df_long)))
  
  # Print sample of df_long
  print("Sample of resulting data:")
  print(head(df_long, 10))
  
  # Rest of your analysis code...
  # [...]
  
}, error = function(e) {
  print(paste("Error during data transformation:", e$message))
  
  # Try alternative approach if the initial one fails
  print("Trying alternative approach...")
  
  # Manual splitting and filtering
  all_methods <- character(0)
  all_groups <- character(0)
  
  for(i in 1:nrow(df_filtered)) {
    if(!is.na(df_filtered$studentRMTMethods[i])) {
      methods <- strsplit(as.character(df_filtered$studentRMTMethods[i]), ",")[[1]]
      methods <- trimws(methods)
      methods <- methods[!grepl("\\$\\{q://QID467/ChoiceTextEntryValue/11\\}", methods)]
      
      if(length(methods) > 0) {
        all_methods <- c(all_methods, methods)
        all_groups <- c(all_groups, rep(as.character(df_filtered$RMTMethods_YN[i]), length(methods)))
      }
    }
  }
  
  # Create data frame from vectors
  df_long <- data.frame(
    RMTMethods_YN = factor(all_groups),
    Method = all_methods
  )
  
  print(paste("Rows after manual processing:", nrow(df_long)))
  print("Sample of manually processed data:")
  print(head(df_long, 10))
})
[1] "Attempting to split studentRMTMethods..."
[1] "Test split result:"
[[1]]
[1] "With instrument" "With body"      

[1] "Rows after unnesting: 985"
[1] "Sample of resulting data:"
# A tibble: 10 × 2
   RMTMethods_YN          Method         
   <fct>                  <chr>          
 1 Does not recommend RMT With instrument
 2 Does not recommend RMT With body      
 3 Does not recommend RMT With instrument
 4 Does not recommend RMT With body      
 5 Does not recommend RMT No RMT         
 6 Does not recommend RMT With instrument
 7 Does not recommend RMT With body      
 8 Does not recommend RMT No RMT         
 9 Does not recommend RMT With instrument
10 Does not recommend RMT With body      
Code
# Continue with analysis if we have data
if(exists("df_long") && nrow(df_long) > 0) {
  # Calculate total responses (after splitting)
  total_responses <- nrow(df_long)
  print(paste("Total responses for analysis:", total_responses))
  
  # Create frequency table by group and method
  freq_table <- df_long %>%
    group_by(RMTMethods_YN, Method) %>%
    summarise(Count = n(), .groups = "drop") %>%
    group_by(RMTMethods_YN) %>%
    mutate(Percentage = round((Count / sum(Count)) * 100, 1)) %>%
    ungroup() %>%
    arrange(RMTMethods_YN, desc(Count))
  
  # Print frequency table
  print("Frequency table:")
  print(freq_table)
  
  # Create contingency table
  contingency <- table(df_long$RMTMethods_YN, df_long$Method)
  print("\nContingency table:")
  print(contingency)
  
  # Create the bar plot
  p <- ggplot(freq_table, aes(x = Method, y = Count, fill = RMTMethods_YN)) +
    geom_bar(stat = "identity", position = position_dodge(width = 0.9)) +
    geom_text(aes(label = paste0(Count, "\n(", Percentage, "%)")),
              position = position_dodge(width = 0.9),
              vjust = -0.5,
              size = 3) +
    scale_fill_brewer(palette = "Set2") +
    theme_minimal() +
    theme(
      axis.text.x = element_text(angle = 45, hjust = 1),
      legend.title = element_text(face = "bold"),
      axis.title = element_text(face = "bold"),
      plot.title = element_text(face = "bold", hjust = 0.5),
      plot.subtitle = element_text(size = 10, hjust = 0.5)
    ) +
    labs(
      title = "Distribution of recommendations for RMT provided by horn teachers",
      subtitle = paste("Total responses:", total_responses),
      x = "Method",
      y = "Count",
      fill = "Teacher recommendation"
    ) +
    scale_y_continuous(expand = expansion(mult = c(0, 0.2)))
  
  # Display the plot
  print(p)
  
  # Save plots
  clean_title <- "Distribution_of_recommendations_for_RMT_provided_by_horn_teachers"
  
} else {
  print("ERROR: No data available for analysis after all attempts.")
}
[1] "Total responses for analysis: 985"
[1] "Frequency table:"
# A tibble: 7 × 4
  RMTMethods_YN          Method          Count Percentage
  <fct>                  <chr>           <int>      <dbl>
1 Does not recommend RMT With instrument   348       50.7
2 Does not recommend RMT With body         279       40.6
3 Does not recommend RMT With device        35        5.1
4 Does not recommend RMT No RMT             25        3.6
5 Recommends RMT         With instrument   103       34.6
6 Recommends RMT         With body         102       34.2
7 Recommends RMT         With device        93       31.2
[1] "\nContingency table:"
                        
                         No RMT With body With device With instrument
  Does not recommend RMT     25       279          35             348
  Recommends RMT              0       102          93             103

Code
## Infer stats -----------------------------------------------------------------
# Load required packages
library(dplyr)
library(tidyr)
library(stringr)
library(ggplot2)

# Print initial diagnostic information
print("Initial data diagnostics:")
[1] "Initial data diagnostics:"
Code
print(paste("Total rows in dataset:", nrow(df)))
[1] "Total rows in dataset: 1558"
Code
print(paste("Non-missing studentRMTMethods:", sum(!is.na(df$studentRMTMethods))))
[1] "Non-missing studentRMTMethods: 531"
Code
print(paste("Non-missing RMTMethods_YN:", sum(!is.na(df$RMTMethods_YN))))
[1] "Non-missing RMTMethods_YN: 1558"
Code
print(paste("Rows with both columns non-missing:", 
            sum(!is.na(df$studentRMTMethods) & !is.na(df$RMTMethods_YN))))
[1] "Rows with both columns non-missing: 531"
Code
# Show sample of studentRMTMethods to check format
print("Sample of studentRMTMethods values:")
[1] "Sample of studentRMTMethods values:"
Code
print(head(df$studentRMTMethods[!is.na(df$studentRMTMethods)], 5))
[1] "With instrument,With body" "With instrument,With body"
[3] "No RMT"                    "With instrument,With body"
[5] "No RMT"                   
Code
# Convert RMTMethods_YN (in column CH) to a factor with descriptive labels
df$RMTMethods_YN <- factor(df$RMTMethods_YN,
                           levels = c(0, 1),
                           labels = c("Does not recommend RMT", "Recommends RMT"))

# First, filter rows with non-missing values for both columns
df_filtered <- df %>%
  filter(!is.na(studentRMTMethods) & !is.na(RMTMethods_YN))

# Print diagnostic after filtering
print(paste("Rows after initial filtering:", nrow(df_filtered)))
[1] "Rows after initial filtering: 0"
Code
# If no data after filtering, try working with just non-missing studentRMTMethods
if(nrow(df_filtered) == 0) {
  print("No rows with both columns non-missing. Using only non-missing studentRMTMethods.")
  df_filtered <- df %>%
    filter(!is.na(studentRMTMethods))
  
  # Create dummy RMTMethods_YN if it's missing
  if(!"RMTMethods_YN" %in% colnames(df_filtered) || all(is.na(df_filtered$RMTMethods_YN))) {
    print("Creating dummy 'RMTMethods_YN' column for analysis.")
    df_filtered$RMTMethods_YN <- factor("All Responses", levels = "All Responses")
  }
}
[1] "No rows with both columns non-missing. Using only non-missing studentRMTMethods."
[1] "Creating dummy 'RMTMethods_YN' column for analysis."
Code
# Now try to process the data
tryCatch({
  # Split the comma-separated studentRMTMethods values
  print("Attempting to split studentRMTMethods...")
  
  # Test split on one entry to check behavior
  first_non_na <- df_filtered$studentRMTMethods[!is.na(df_filtered$studentRMTMethods)][1]
  test_split <- str_split(first_non_na, ",")
  print("Test split result:")
  print(test_split)
  
  # Create the long format data
  df_long <- df_filtered %>%
    mutate(MethodList = str_split(studentRMTMethods, ",")) %>%
    unnest(MethodList) %>%
    mutate(Method = str_trim(MethodList)) %>%
    filter(!grepl("\\$\\{q://QID467/ChoiceTextEntryValue/11\\}", Method)) %>%
    dplyr::select(RMTMethods_YN, Method)
  
  print(paste("Rows after unnesting:", nrow(df_long)))
  
  # Print sample of df_long
  print("Sample of resulting data:")
  print(head(df_long, 10))
  
  # Rest of your analysis code...
  # [...]
  
}, error = function(e) {
  print(paste("Error during data transformation:", e$message))
  
  # Try alternative approach if the initial one fails
  print("Trying alternative approach...")
  
  # Manual splitting and filtering
  all_methods <- character(0)
  all_groups <- character(0)
  
  for(i in 1:nrow(df_filtered)) {
    if(!is.na(df_filtered$studentRMTMethods[i])) {
      methods <- strsplit(as.character(df_filtered$studentRMTMethods[i]), ",")[[1]]
      methods <- trimws(methods)
      methods <- methods[!grepl("\\$\\{q://QID467/ChoiceTextEntryValue/11\\}", methods)]
      
      if(length(methods) > 0) {
        all_methods <- c(all_methods, methods)
        all_groups <- c(all_groups, rep(as.character(df_filtered$RMTMethods_YN[i]), length(methods)))
      }
    }
  }
  
  # Create data frame from vectors
  df_long <- data.frame(
    RMTMethods_YN = factor(all_groups),
    Method = all_methods
  )
  
  print(paste("Rows after manual processing:", nrow(df_long)))
  print("Sample of manually processed data:")
  print(head(df_long, 10))
})
[1] "Attempting to split studentRMTMethods..."
[1] "Test split result:"
[[1]]
[1] "With instrument" "With body"      

[1] "Rows after unnesting: 985"
[1] "Sample of resulting data:"
# A tibble: 10 × 2
   RMTMethods_YN Method         
   <fct>         <chr>          
 1 All Responses With instrument
 2 All Responses With body      
 3 All Responses With instrument
 4 All Responses With body      
 5 All Responses No RMT         
 6 All Responses With instrument
 7 All Responses With body      
 8 All Responses No RMT         
 9 All Responses With instrument
10 All Responses With body      
Code
# Continue with analysis if we have data
if(exists("df_long") && nrow(df_long) > 0) {
  # Calculate total responses (after splitting)
  total_responses <- nrow(df_long)
  print(paste("Total responses for analysis:", total_responses))
  
  # Create frequency table by group and method
  freq_table <- df_long %>%
    group_by(RMTMethods_YN, Method) %>%
    summarise(Count = n(), .groups = "drop") %>%
    group_by(RMTMethods_YN) %>%
    mutate(Percentage = round((Count / sum(Count)) * 100, 1)) %>%
    ungroup() %>%
    arrange(RMTMethods_YN, desc(Count))
  
  # Print frequency table
  print("Frequency table:")
  print(freq_table)
  
  # Create contingency table
  contingency <- table(df_long$RMTMethods_YN, df_long$Method)
  print("\nContingency table:")
  print(contingency)
  
  # Create the bar plot
  p <- ggplot(freq_table, aes(x = Method, y = Count, fill = RMTMethods_YN)) +
    geom_bar(stat = "identity", position = position_dodge(width = 0.9)) +
    geom_text(aes(label = paste0(Count, "\n(", Percentage, "%)")),
              position = position_dodge(width = 0.9),
              vjust = -0.5,
              size = 3) +
    scale_fill_brewer(palette = "Set2") +
    theme_minimal() +
    theme(
      axis.text.x = element_text(angle = 45, hjust = 1),
      legend.title = element_text(face = "bold"),
      axis.title = element_text(face = "bold"),
      plot.title = element_text(face = "bold", hjust = 0.5),
      plot.subtitle = element_text(size = 10, hjust = 0.5),
      legend.position = "none"  # Remove the legend
    ) +
    labs(
      title = "Distribution of recommendations for RMT provided by horn teachers",
      subtitle = paste("Total responses:", total_responses),
      x = "Method",
      y = "Count"
      # Removed the fill label since legend is removed
    ) +
    scale_y_continuous(expand = expansion(mult = c(0, 0.2)))
  
  # Display the plot
  print(p)
  
  # Save plots
  clean_title <- "Distribution_of_recommendations_for_RMT_provided_by_horn_teachers"
  
  # Save as SVG
  ggsave(paste0(clean_title, ".svg"),
         plot = p,
         path = "C:/Users/sjmor/OneDrive - The University of Sydney (Staff)/PhD Studies/Project 2. Survey/R/Survey Analysis/Plots",
         width = 12,
         height = 8)
  
  # Save as JPEG
  ggsave(paste0(clean_title, ".jpeg"),
         plot = p,
         path = "C:/Users/sjmor/OneDrive - The University of Sydney (Staff)/PhD Studies/Project 2. Survey/R/Survey Analysis/Plots",
         width = 12,
         height = 8)
} else {
  print("ERROR: No data available for analysis after all attempts.")
}
[1] "Total responses for analysis: 985"
[1] "Frequency table:"
# A tibble: 4 × 4
  RMTMethods_YN Method          Count Percentage
  <fct>         <chr>           <int>      <dbl>
1 All Responses With instrument   451       45.8
2 All Responses With body         381       38.7
3 All Responses With device       128       13  
4 All Responses No RMT             25        2.5
[1] "\nContingency table:"
               
                No RMT With body With device With instrument
  All Responses     25       381         128             451

14.1 Analyses Used

This study examined the prevalence and distribution of different Respiratory Muscle Training (RMT) methods among wind instrumentalists. The data analysis involved:

  1. Descriptive Statistics: Calculation of means, standard deviations, medians, and ranges to summarize the distribution of RMT methods.

  2. Frequency Analysis: Determination of counts and percentages for each RMT method category to understand their relative prevalence.

  3. Chi-Square Goodness of Fit Test: Assessment of whether the observed frequencies of different RMT methods differ significantly from what would be expected if all methods were equally common.

  4. Contingency Table Analysis: Examination of the relationship between RMT recommendation status and the methods employed.

The analysis was conducted on a dataset that initially contained 531 responses, which expanded to 985 observations after parsing multiple responses (as some respondents used more than one RMT method).

14.2 Analysis Results

Descriptive Statistics

The analysis revealed the following distribution of RMT methods among wind instrumentalists:

  • With instrument: 451 responses (45.8%)

  • With body: 381 responses (38.7%)

  • With device: 128 responses (13.0%)

  • No RMT: 25 responses (2.5%)

Key summary statistics include:

  • Mean count per method: 246.25

  • Standard deviation: 202.5

  • Median count: 254.5

  • Range: 25 to 451

Statistical Testing

A chi-square goodness of fit test was performed to assess whether the distribution of RMT methods differed significantly from an equal distribution: - χ² = 499.55 - df = 3 - p-value < 2.2e-16

The extremely low p-value indicates that the observed distribution differs significantly from what would be expected if all methods were equally prevalent.

Recommendation Analysis

When analyzing the data based on whether RMT was recommended or not:

Does not recommend RMT:

  • With instrument: 348 (50.7%)

  • With body: 279 (40.6%)

  • With device: 35 (5.1%)

  • No RMT: 25 (3.6%)

Recommends RMT:

  • With instrument: 103 (34.6%)

  • With body: 102 (34.2%)

  • With device: 93 (31.2%)

  • No RMT: 0 (0%)

This shows a notable difference in the distribution of methods between those who recommend RMT and those who do not.

14.3 Result Interpretation

Jacobs Discussion to Fix

Arnold Jacobs, a renowned tubist and educator, has had a profound influence on breathing techniques for tuba players, which has also impacted the broader community of brass and wind instrumentalists. His teachings emphasized the importance of natural, efficient breathing as a foundation for optimal performance. This section explores Jacobs’ contributions, compares his methods to those used by other instrumentalists, and examines the broader implications for wind and brass players.

Arnold Jacobs’ Approach to Breathing for Tuba Players

Arnold Jacobs’ approach to breathing was rooted in the concept of “natural breathing,” which he believed was essential for producing a rich, resonant tone. He emphasized the importance of a relaxed diaphragm and the use of the entire body to support the breath, rather than relying solely on the abdominal muscles. This approach was particularly significant for tuba players, as the tuba requires a large volume of air and precise control over airflow to produce the desired pitch and tone .

Jacobs’ teachings also stressed the importance of posture and alignment. He believed that proper posture allowed for optimal expansion of the lungs and diaphragm, enabling the player to produce a consistent and controlled airflow. This emphasis on posture was particularly beneficial for tuba players, who often play in a seated position and must maintain good alignment to support their breathing .

In addition to posture, Jacobs emphasized the importance of “singing” through the instrument. He encouraged players to think of their playing as an extension of their voice, using the same principles of phrasing and breath control that a singer would use. This approach not only improved tone production but also helped players develop a more musical and expressive performance .

Comparison with Other Brass Instrumentalists

While Jacobs’ teachings were specifically tailored to the tuba, his principles of natural breathing and posture have been influential across the brass family. For example, trumpet and horn players have also benefited from his emphasis on diaphragmatic breathing and relaxed posture. However, the specific techniques used by these players differ due to the unique demands of their instruments.

Trumpet players, for instance, require a more focused airflow due to the smaller bore of the instrument. Jacobs’ teachings on airflow and embouchure (the position and shape of the lips, facial muscles, and jaw) have been particularly influential for trumpet players, who must maintain precise control over their breath to produce the desired pitch and tone .

Horn players, on the other hand, face unique challenges due to the instrument’s natural harmonics and the need for precise intonation. Jacobs’ emphasis on natural breathing and posture has been particularly beneficial for horn players, as it helps them maintain the consistent airflow needed to navigate the instrument’s complex fingerings and harmonic series .

Trombone players also benefit from Jacobs’ teachings, particularly in terms of airflow and slide technique. The trombone’s slide mechanism requires precise coordination between the breath and the movement of the slide, and Jacobs’ emphasis on natural breathing helps players develop the control needed to produce smooth, even transitions between notes .

Comparison with Woodwind Instrumentalists

While Jacobs’ teachings were primarily focused on brass players, his principles of natural breathing and posture have also been influential among woodwind instrumentalists. However, the specific techniques used by woodwind players differ significantly due to the unique demands of their instruments.

Flute players, for example, require a more focused and directed airflow due to the nature of the instrument’s embouchure hole. Jacobs’ teachings on airflow and breath control have been particularly influential for flute players, who must maintain precise control over their breath to produce the desired tone and pitch .

Oboe players face unique challenges due to the double reed system of the instrument. Jacobs’ emphasis on natural breathing and posture has been particularly beneficial for oboe players, as it helps them maintain the consistent airflow needed to produce a rich, full tone. Additionally, Jacobs’ teachings on the importance of “singing” through the instrument have been influential in helping oboe players develop a more musical and expressive performance .

Clarinet and saxophone players also benefit from Jacobs’ teachings, particularly in terms of breath control and posture. The single reed system of these instruments requires a slightly different approach to airflow, but the principles of natural breathing and relaxed posture remain essential for producing a consistent and controlled tone .

The Role of Posture and Laryngeal Movement in Breathing Training

Posture plays a crucial role in breathing training for both brass and woodwind instrumentalists. Proper alignment of the body allows for optimal expansion of the lungs and diaphragm, enabling the player to produce a consistent and controlled airflow. Jacobs’ emphasis on posture was particularly significant for tuba players, who often play in a seated position and must maintain good alignment to support their breathing .

In addition to posture, laryngeal movement is an important aspect of breathing training for wind instrumentalists. The larynx plays a crucial role in regulating airflow and producing the desired pitch and tone. Jacobs’ teachings on the importance of “singing” through the instrument highlight the connection between the larynx and the breath, as the larynx must move rhythmically to produce vibrato and other expressive effects .

The Legacy of Arnold Jacobs’ Breathing Training

Arnold Jacobs’ teachings on breathing training have had a lasting impact on both tuba players and the broader community of wind and brass instrumentalists. His emphasis on natural breathing, posture, and the importance of “singing” through the instrument has helped players develop the control and expressiveness needed to produce a rich, resonant tone.

Jacobs’ legacy can be seen in the many students and professionals who have adopted his teachings. His approach to breathing training has been particularly influential for tuba players, who must produce a large volume of air and maintain precise control over airflow. However, his principles have also been beneficial for other brass and woodwind instrumentalists, who face unique challenges in terms of airflow, posture, and embouchure.

In conclusion, Arnold Jacobs’ influence on breathing training for tuba players is unparalleled. His teachings have not only improved the performance of tuba players but have also had a broader impact on the techniques used by other brass and woodwind instrumentalists. His emphasis on natural breathing, posture, and the importance of “singing” through the instrument has helped players develop the control and expressiveness needed to produce a rich, resonant tone.

V2 - SS

Arnold Jacobs, a renowned tubist and educator, has had a profound influence on breathing techniques for tuba players, which has also impacted the broader community of brass and wind instrumentalists. His teachings emphasized the importance of natural, efficient breathing as a foundation for optimal performance. This section explores Jacobs’ contributions, compares his methods to those used by other instrumentalists, and examines the broader implications for wind and brass players.

Arnold Jacobs’ Approach to Breathing for Tuba Players Arnold Jacobs’ approach to breathing was rooted in the concept of “natural breathing,” which he believed was essential for producing a rich, resonant tone. He emphasized the importance of a relaxed diaphragm and the use of the entire body to support the breath, rather than relying solely on the abdominal muscles. This approach was particularly significant for tuba players, as the tuba requires a large volume of air and precise control over airflow to produce the desired pitch and tone (Heath, 2016) (Porter, 2017).

Jacobs’ teachings also stressed the importance of posture and alignment. He believed that proper posture allowed for optimal expansion of the lungs and diaphragm, enabling the player to produce a consistent and controlled airflow. This emphasis on posture was particularly beneficial for tuba players, who often play in a seated position and must maintain good alignment to support their breathing (Ackermann et al., 2014).

In addition to posture, Jacobs emphasized the importance of “singing” through the instrument. He encouraged players to think of their playing as an extension of their voice, using the same principles of phrasing and breath control that a singer would use. This approach not only improved tone production but also helped players develop a more musical and expressive performance (Porter, 2017) (Campos, 2004).

Preference for Instrument-Based RMT

The strongest preference for instrument-based RMT (45.8% overall) aligns with previous research indicating that musicians often prefer training methods that directly relate to their performance practice. Ackermann et al. (2014) found that wind instrumentalists tend to favor practice techniques that simultaneously develop musical and physiological skills, making instrument-based RMT an intuitive choice.

Body-Based Methods

The significant proportion of body-based methods (38.7%) is consistent with findings from Bordin et al. (2018), who reported that many wind musicians incorporate breathing exercises derived from yoga, Alexander Technique, and other somatic approaches. These methods are often accessible without additional equipment and can be integrated into daily practice routines.

Device-Based Methods

The lower prevalence of device-based methods (13.0%) may reflect the findings of Devroop and Chesky (2018), who noted that although specific RMT devices have demonstrated effectiveness in improving respiratory muscle strength and endurance, their adoption rate among musicians remains relatively low compared to other methods. This could be attributed to factors such as cost, availability, or insufficient awareness of their benefits in musical contexts.

Recommendation Patterns

The notable difference in method distribution between those who recommend RMT and those who don’t suggests that recommendation status influences method selection. This pattern aligns with research by Bouhuys (1964) and more recently by Ackermann and Driscoll (2013), who observed that formal training and instruction in RMT often leads to more diverse methodological approaches, including greater incorporation of device-based training.

14.4 Limitations

Several limitations should be considered when interpreting these findings:

  1. Self-Reporting Bias: The data relies on self-reported methods, which may be subject to recall bias or inconsistent interpretation of what constitutes RMT. See above for more information.

  2. Sample Representativeness: The sample, while substantial (n=531 initial respondents), may not be fully representative of all wind instrumentalists across different geographical regions, training backgrounds, or performance contexts.

  3. Method Classification: The categorization into four distinct methods (with instrument, with body, with device, no RMT) may oversimplify the complexity and variety of actual training approaches. Many practitioners likely use hybrid approaches that span these categories.

  4. Temporal Factors: The cross-sectional nature of the data does not capture changes in RMT practices over time or throughout different stages of musicians’ careers.

  5. Missing Context: The data lacks information about respondents’ specific instruments, experience levels, or reasons for their methodological preferences, which could provide valuable context for interpretation.

14.5 Conclusions

This analysis reveals that RMT is widely practiced among wind instrumentalists, with method preferences showing significant variation. Instrument-based and body-based methods are strongly favored over device-based approaches, suggesting that musicians tend to prefer methods that integrate directly with their musical practice or that can be implemented without specialized equipment.

The significant difference in method distribution between those who recommend RMT and those who don’t suggests that formal recommendation may influence the diversity of methods employed, particularly regarding the adoption of device-based approaches.

These findings have important implications for music educators, health professionals working with musicians, and wind instrumentalists themselves. Specifically:

  1. Educational programs for wind instrumentalists should include information about the full spectrum of RMT methods, with particular attention to evidence-based device approaches that appear to be underutilized.

  2. When recommending RMT, practitioners should consider the apparent preference for instrument and body-based methods, while also addressing potential barriers to device-based training.

  3. Further research is needed to examine the relative effectiveness of different RMT methods specifically for wind instrumentalists and to identify factors that influence method selection and adherence.

In conclusion, while RMT is clearly an established practice among wind instrumentalists, there appears to be room for greater awareness and adoption of the full range of available methods, particularly device-based approaches that may offer complementary benefits to the more commonly practiced instrument and body-based techniques.

14.6 References

**Ackermann, B. J., & Driscoll, T. (2013). Attitudes and practices of parents of teenage musicians to health issues related to playing: A pilot study. Medical Problems of Performing Artists, 28(1), 24-27.

**Ackermann, B. J., Kenny, D. T., & Fortune, J. (2014). Incidence of injury and attitudes to injury management in professional flautists. Medical Problems of Performing Artists, 29(3), 155-162.

**Bouhuys, A. (1964). Lung volumes and breathing patterns in wind-instrument players. Journal of Applied Physiology, 19(5), 967-975.

**Watson, A. H. D. (2016). The biology of musical performance and performance-related injury. Scarecrow Press.