Load pre-calculated curve
The first step is to either load the pre-calculated curve in
.rds
format obtained in the dose-effect fitting module or
input the curve coefficients manually. Clicking on “Preview data” will
load the curve into the app and display it on the “Results” tabbed
box.
data:image/s3,"s3://crabby-images/1ebdb/1ebdb3deacad9e1b432e2cd32463d93d2c4fff8d" alt="'Curve fitting data options' box and 'Results' tabbed box in the dose estimation module when loading curve from an `.rds` file."
‘Curve fitting data options’ box and ‘Results’ tabbed box in the dose
estimation module when loading curve from an .rds
file.
data:image/s3,"s3://crabby-images/7dc54/7dc54f98dcf85dbfa034ac0bbf85a97b8735f018" alt="'Curve fitting data options' box and 'Results' tabbed box in the dose estimation module when inputting curve coefficients manually. Note that if no variance-covariance matrix is provided, only the variances calculated from the coefficients' standard errors will be used in calculations."
‘Curve fitting data options’ box and ‘Results’ tabbed box in the dose estimation module when inputting curve coefficients manually. Note that if no variance-covariance matrix is provided, only the variances calculated from the coefficients’ standard errors will be used in calculations.
This step is accomplished in R by either using the results from
fit()
or by loading an existing .rds
object
via readRDS()
:
fit_results <- system.file("extdata", "translocations-fitting-results.rds", package = "biodosetools") %>%
readRDS()
fit_results$fit_coeffs
#> 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
Calculate genomic conversion factor
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.
data:image/s3,"s3://crabby-images/edd2b/edd2b04453f2da037d1a3e638505fa824530b213" alt="'Stains color options', 'Chromosome data' and 'Genomic conversion factor' boxes in the dose estimation module."
‘Stains color options’, ‘Chromosome data’ and ‘Genomic conversion factor’ boxes in the dose estimation module.
To calculate the genomic conversion factor in R we call the
calculate_genome_factor()
function:
genome_factor <- calculate_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
Input case data
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 total number of cells
(),
total number of aberrations
(),
as well as mean
(),
standard error
(),
dispersion index
(),
-value,
expected translocation rate
(),
full genome mean
(),
and full genome error
().
data:image/s3,"s3://crabby-images/8ddb8/8ddb81dc0aeac763682b9a87b44018160a311273" alt="'Data input options' and 'Data input' boxes in the dose estimation module."
‘Data input options’ and ‘Data input’ boxes in the dose estimation module.
This step is accomplished in R by calling the
calculate_aberr_table()
function:
case_data <- data.frame(
C0 = 288, C1 = 52, C2 = 9, C3 = 1
) %>%
calculate_aberr_table(
type = "case",
assessment_u = 1,
aberr_module = "translocations"
) %>%
dplyr::mutate(
Xc = 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
#> # A tibble: 1 × 13
#> N X C0 C1 C2 C3 Fp Fp_err DI u Xc Fg
#> <int> <int> <int> <int> <int> <int> <dbl> <dbl> <dbl> <dbl> <dbl> <dbl>
#> 1 350 73 288 52 9 1 0.209 0.0259 1.12 1.64 1.02 0.352
#> # ℹ 1 more variable: Fg_err <dbl>
Perform dose estimation
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.
data:image/s3,"s3://crabby-images/676c4/676c4630e35c20b04f286f988abe53758d1e8de0" alt="'Dose estimation options' box in the dose estimation module."
‘Dose estimation options’ box in the dose estimation module.
data:image/s3,"s3://crabby-images/5e5d9/5e5d902ed2b1f6f720288a64978f5a85ed943cc6" alt="'Results' tabbed box, 'Curve plot' and 'Save results' boxes in the dose estimation module."
‘Results’ tabbed box, ‘Curve plot’ and ‘Save results’ boxes in the dose estimation module.
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_coeffs <- fit_results[["fit_coeffs"]]
fit_var_cov_mat <- fit_results[["fit_var_cov_mat"]]
Since we have a protracted exposure, we need to calculate the value of :
protracted_g_value <- protracted_g_function(
time = 0.5,
time_0 = 2
)
protracted_g_value
#> [1] 0.9216251
results_whole_delta <- estimate_whole_body_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"
)
data:image/s3,"s3://crabby-images/c0211/c02115ab2154cadd64b56e7ec31736063c37c5b3" alt="Plot of estimated doses generated by \{biodosetools\}. The grey shading indicates the uncertainties associated with the calibration curve."
Plot of estimated doses generated by {biodosetools}. The grey shading indicates the uncertainties associated with the calibration curve.