The first step is to either load the pre-calculated curve in .rds
format obtained in the dose-effect fitting module or to input the curve coefficients manually. Clicking on “Preview data” will load the curve into the app and display it on the “Results” tabbed box.
This step is accomplished in R by either using the results from fit()
or by loading an existing .rds
object via readRDS()
:
<- system.file("extdata", "translocations-fitting-results.rds",
fit_results package = "biodosetools") %>%
readRDS()
$fit_coeffs
fit_results#> estimate std.error statistic p.value
#> coeff_C 0.006560406 0.002052834 3.195780 2.538519e-02
#> coeff_alpha 0.027197296 0.009922177 2.741061 5.081502e-02
#> coeff_beta 0.057982322 0.004630926 12.520675 3.100113e-06
To be able to fit the equivalent full genome case data, we need to calculate the genomic conversion factor.
To do this, in the “Stain color options” box we select the sex of the individual, and the list of chromosomes and stains used for the translocation assay. Clicking on “Generate table” will show a table in the “Chromosome data” box in which we select the chromosome-stain pairs. Clicking on the “Calculate fraction” will calculate the genomic conversion factor.
To calculate the genomic conversion factor in R we call the calculate_genome_factor()
function:
<- calculate_genome_factor(
genome_factor dna_table = dna_content_fractions_morton,
chromosome = c(1, 2, 3, 4, 5, 6),
color = c("Red", "Red", "Green", "Red", "Green", "Green"),
sex = "male"
)
genome_factor#> [1] 0.5847343
Next we can choose to either load the case data from a file (supported formats are .csv
, .dat
, and .txt
) or to input the data manually. If needed, the user can select to use confounders (either using Sigurdson’s method, or by inputting the translocation frequency per cell). Once the table is generated and filled, the “Calculate parameters” button will calculate the number of cells (\(N\)), number of aberrations (\(X\)), as well as mean (\(\bar{F}_{p}\)), error (\(\hat{\sigma}_{p}\)), dispersion index (\(\hat{\sigma}^{2}/\bar{y}\)), \(u\)-value, expected translocation rate (\(X_{c}\)), full genome mean (\(\bar{F}_{g}\)), and full genome error (\(\hat{\sigma}_{g}\)).
This step is accomplished in R by calling the calculate_aberr_table()
function:
<- data.frame(
case_data C0 = 288, C1 = 52, C2 = 9, C3 = 1
%>%
) calculate_aberr_table(
type = "case",
assessment_u = 1
%>%
) ::rename(Fp = mean, Fp_err = std_err) %>%
dplyr::mutate(
dplyrXc = calculate_trans_rate_sigurdson(
cells = N,
genome_factor = genome_factor,
age_value = 30,
smoker_bool = TRUE
),Fg = (X - Xc) / (N * genome_factor),
Fg_err = Fp_err / sqrt(genome_factor)
)
case_data#> N X C0 C1 C2 C3 Fp Fp_err DI u Xc Fg
#> 1 350 73 288 52 9 1 0.2085714 0.02587389 1.123405 1.641448 1.021469 0.3517033
#> Fg_err
#> 1 0.03383626
The final step is to select the dose estimation options. In the “Dose estimation options” box we can select type of exposure (acute or protracted), type of assessment (whole-body or partial-body), and error methods for each type of assessment.
To perform the dose estimation in R we can call the adequate estimate_*()
functions. In this example, we will use estimate_whole_body_delta()
. First of all, however, we will need to load the fit coefficients and variance-covariance matrix:
<- fit_results[["fit_coeffs"]]
fit_coeffs <- fit_results[["fit_var_cov_mat"]] fit_var_cov_mat
Since we have a protracted exposure, we need to calculate the value of \(G(x)\):
<- protracted_g_function(
protracted_g_value time = 0.5,
time_0 = 2
)
protracted_g_value#> [1] 0.9216251
<- estimate_whole_body_delta(
results_whole_delta
case_data,
fit_coeffs,
fit_var_cov_mat,conf_int = 0.95,
protracted_g_value,aberr_module = "translocations"
)
To visualise the estimated doses, we call the plot_estimated_dose_curve()
function:
plot_estimated_dose_curve(
est_doses = list(whole = results_whole_delta),
fit_coeffs,
fit_var_cov_mat,
protracted_g_value,conf_int_curve = 0.95,
aberr_name = "Translocations"
)