file list

# looking non-recursively, only top level folder
rmd_files <- tibble(
  type = "RMarkdown", 
  target_folder = rmd_docs_folder,
  source_file = list.files(
    path = ".",
    pattern = sprintf("(%s)$", paste(rmd_ext, collapse = "|")))
)
nb_files <- tibble(
  type = "Jupyter NB", 
  target_folder = nb_docs_folder,
  source_file = list.files(
    path = ".", 
    pattern = sprintf("(%s)$", paste(nb_ext, collapse = "|")))
)
docs_files <- 
  bind_rows(rmd_files, nb_files) %>% 
  mutate(
    source_copy = file.path(target_folder, source_file),
    source_file_hash = tools::md5sum(source_file),
    doc_file = str_replace(source_copy, "\\.[^.]+$", ".html")
  ) %>% 
  # exclude template files
  filter(!source_file %in% c("template.Rmd", "template.ipynb"))

# docs hash
if (file.exists(hash_file)) {
  docs_hash <- read_csv(hash_file, col_types = "ccccccc")
} else {
  docs_hash <- tibble(
    type = character(),
    source_file = character(),
    source_copy = character(),
    source_file_hash = character(),
    doc_file = character(),
    last_success = character(),
    last_fail = character()
  )
} 

# files with hash
docs_files <- 
  docs_files %>% 
  left_join(
    rename(docs_hash, existing_source_file_hash = source_file_hash), 
    by = c("source_file", "source_copy", "doc_file", "type")
  ) %>% 
  mutate(
    # generate if
    # a) the file is new
    # b) the source file has changed
    # c) it has failed on the last attempt
    # d) it has never been succesfully generated
    # e) the file does not exist although it should be there
    generate = 
      always_regenerate | 
      is.na(existing_source_file_hash) | 
      !map2_lgl(source_file_hash, existing_source_file_hash, identical) |
      !is.na(last_fail) |
      is.na(last_success) |
      !file.exists(doc_file)
  ) %>% 
  select(-existing_source_file_hash)

# file info
docs_files %>% select(-target_folder) %>% knitr::kable()
type source_file source_copy source_file_hash doc_file last_success last_fail generate
RMarkdown 180228_OM18_DIC.Rmd docs/rmarkdown/180228_OM18_DIC.Rmd d6417a376802984b0f2939990a2b9f4e docs/rmarkdown/180228_OM18_DIC.html NA 2021-07-21 22:27:05 EDT TRUE
RMarkdown 180306_OM18_DIC.Rmd docs/rmarkdown/180306_OM18_DIC.Rmd 2787a7c75e9db83e557ec75b9ffa6da5 docs/rmarkdown/180306_OM18_DIC.html NA 2021-07-21 22:27:05 EDT TRUE
RMarkdown 190208_OM19_DIC.Rmd docs/rmarkdown/190208_OM19_DIC.Rmd 6df306329ce4868406d23b1bece781c4 docs/rmarkdown/190208_OM19_DIC.html NA 2021-07-21 22:27:05 EDT TRUE
RMarkdown 191130_OM19_CH4_dD.Rmd docs/rmarkdown/191130_OM19_CH4_dD.Rmd 08b4c7c9bea77f3608c79550c1276054 docs/rmarkdown/191130_OM19_CH4_dD.html 2021-07-21 22:27:05 EDT NA FALSE
RMarkdown 191218_OM19_C1-C3-HCs_d13C.Rmd docs/rmarkdown/191218_OM19_C1-C3-HCs_d13C.Rmd b8fc7120b52636acd107185df40bf97e docs/rmarkdown/191218_OM19_C1-C3-HCs_d13C.html 2021-07-21 22:27:05 EDT NA FALSE
RMarkdown 201012_BA1_logs.Rmd docs/rmarkdown/201012_BA1_logs.Rmd cc5536618ec2024e728f101fedc8c583 docs/rmarkdown/201012_BA1_logs.html 2021-07-21 22:18:20 EDT NA FALSE
RMarkdown 201013_packer_paper_figs.Rmd docs/rmarkdown/201013_packer_paper_figs.Rmd f6e913c44b326626df6ce661334639fa docs/rmarkdown/201013_packer_paper_figs.html 2021-07-21 21:26:15 EDT NA FALSE
RMarkdown BA1_16S_processing.Rmd docs/rmarkdown/BA1_16S_processing.Rmd e659829d6edaccba47f66a3366f4f3b4 docs/rmarkdown/BA1_16S_processing.html 2021-07-21 22:18:20 EDT NA FALSE
timestamp <- Sys.time() %>% format("%Y-%m-%d %H:%M:%S %Z")

# find system command
# @param cmd - can be a vector of alternative commands, will return the first valid one it finds, errors if none are valid
find_cmd <- function(cmd) {
  cmds <- Sys.which(cmd)
  cmds <- cmds[cmds != ""]
  if (length(cmds) == 0) 
    stop("cannot find path to cmd '", paste(cmd, collapse = "' or '"), "'", call. = FALSE)
  return(cmds[1])
}

# rendering functions return system2 captured output
render_rmd <- function(source_file, doc_file) {
  # works more reliably as an external command instead of triggering from within this knit itself
  cmd <- find_cmd(c("Rscript", "Rscript.exe"))
  args <- sprintf("-e \"rmarkdown::render('%s', output_file = '%s', output_format = 'html_document')\"", source_file, doc_file)
  suppressWarnings(system2(cmd, args = args, stdout = TRUE, stderr = TRUE))
}   

render_nb <- function(source_file, target_folder) {
  # does not seem to be a way to specify doc_file directly
  nbconvert_arg <- 
    sprintf("nbconvert --to html --execute \"%s\" --output-dir \"%s\"", 
            source_file, target_folder)
  jupyter_cmd <- find_cmd(c("jupyter", "jupyter.exe"))
  if (!is.null(py_venv)) {
    # not soure how to deal with this on Windows since source is a script, not an OS command...
    cmd <- "source"
    args <- sprintf("activate %s && %s %s", py_venv, jupyter_cmd, nbconvert_arg)
  } else {
    cmd <- jupyter_cmd
    args <- nbconvert_arg
  }
  suppressWarnings(system2(cmd, args = args, stdout = TRUE, stderr = TRUE))
}
render_file <- function(generate, type, source_file, source_copy, target_folder, doc_file) {
  
  if (!generate) {
    cat("<h1>", source_file, " (NC)</h1>\n")
    message("source file has not changed, docs file will not be re-generated (delete file in docs folder to force re-generation)")
    return(NA)
  }
  
  # copy source file with extra md header to account for jekyll
  # stripping it out when generating the github page
  if (file.exists(source_copy)) file.remove(source_copy)
  write("---\n---", file = source_copy)
  file.append(source_copy, source_file)
  
  # render
  if (type == "RMarkdown")
    out <- render_rmd(source_file = source_file, doc_file = doc_file)
  else if (type == "Jupyter NB")
    out <- render_nb(source_file = source_file, target_folder = target_folder)
  else
    stop("unknown file type ", type)
  success <- is.null(attr(out, "status")) & file.exists(doc_file)
  
  # info
  if (success) cat("<h1>", source_file, " (OK)</h1>\n")
  else cat("<h1>", source_file, " (ERROR)</h1>\n")
  if (length(out) > 0) message(paste(out, collapse = "\n"))
  
  # file missing message
  if (!file.exists(doc_file)) 
    message("File did not get created successfully.")
  
  return(success)
}

# render all
rendered_doc_files <- docs_files %>% 
  mutate(success = pmap_lgl(
    list(
      generate = generate,
      type = type,
      source_file = source_file,
      source_copy = source_copy,
      target_folder = target_folder,
      doc_file = doc_file
    ),
    render_file
  ))

180228_OM18_DIC.Rmd (OK)



processing file: 180228_OM18_DIC.Rmd

  |                                                                            
  |                                                                      |   0%
  |                                                                            
  |.                                                                     |   1%
   inline R code fragments


  |                                                                            
  |.                                                                     |   2%
label: setup (with options) 
List of 2
 $ warning: logi FALSE
 $ message: logi FALSE

── Attaching packages ─────────────────────────────────────── tidyverse 1.3.1 ──
✓ ggplot2 3.3.5     ✓ purrr   0.3.4
✓ tibble  3.1.2     ✓ dplyr   1.0.7
✓ tidyr   1.1.3     ✓ stringr 1.4.0
✓ readr   2.0.0     ✓ forcats 0.5.1
── Conflicts ────────────────────────────────────────── tidyverse_conflicts() ──
x dplyr::filter() masks stats::filter()
x dplyr::lag()    masks stats::lag()

Attaching package: 'isoreader'

The following object is masked from 'package:stats':

    filter


Attaching package: 'isoprocessor'

The following objects are masked from 'package:isoreader':

    iso_calculate_ratios, iso_convert_signals, iso_convert_time,
    iso_plot_continuous_flow_data, iso_plot_dual_inlet_data,
    iso_plot_raw_data

The following object is masked from 'package:stats':

    filter


Attaching package: 'plotly'

The following object is masked from 'package:ggplot2':

    last_plot

The following object is masked from 'package:stats':

    filter

The following object is masked from 'package:graphics':

    layout

Loading required package: ggpp

Attaching package: 'ggpp'

The following object is masked from 'package:ggplot2':

    annotate


  |                                                                            
  |..                                                                    |   3%
   inline R code fragments


label: load-data (with options) 
List of 1
 $ message: logi FALSE

Info: preparing to read 1 data files (all will be cached), setting up 1 par...
Info (process 1): reading file 'data_raw/180228_DBN_DIC/180228_DBN_DIC_data...
Info (process 1): loaded 47 data files from R Data Storage
Info: finished reading 1 files in 2.97 secs

  |                                                                            
  |...                                                                   |   4%
  ordinary text without R code


  |                                                                            
  |....                                                                  |   5%
label: process-file-info

  |                                                                            
  |....                                                                  |   6%
  ordinary text without R code


  |                                                                            
  |.....                                                                 |   7%
label: chroms

  |                                                                            
  |.....                                                                 |   8%
  ordinary text without R code


  |                                                                            
  |......                                                                |   9%
label: peak-maps

  |                                                                            
  |.......                                                               |   9%
  ordinary text without R code


  |                                                                            
  |.......                                                               |  10%
label: peak-table

  |                                                                            
  |........                                                              |  11%
  ordinary text without R code


  |                                                                            
  |........                                                              |  12%
label: chrom-labeled (with options) 
List of 1
 $ fig.height: num 5


  |                                                                            
  |.........                                                             |  13%
  ordinary text without R code


  |                                                                            
  |..........                                                            |  14%
label: select-analyte-peaks

  |                                                                            
  |..........                                                            |  15%
  ordinary text without R code


  |                                                                            
  |...........                                                           |  16%
label: mutate-transfer-t

  ordinary text without R code


  |                                                                            
  |............                                                          |  17%
label: chrom-model-good

  |                                                                            
  |.............                                                         |  18%
  ordinary text without R code


  |                                                                            
  |.............                                                         |  19%
label: chrom-training (with options) 
List of 1
 $ warning: logi FALSE

Warning: Problem with `mutate()` column `amp44`.
ℹ `amp44 = `%>%`(...)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
Warning: Problem with `mutate()` column `amp44`.
ℹ `amp44 = `%>%`(...)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
Warning: Problem with `mutate()` column `amp44`.
ℹ `amp44 = `%>%`(...)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
Warning: Problem with `mutate()` column `amp44`.
ℹ `amp44 = `%>%`(...)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
Warning: Problem with `mutate()` column `amp44`.
ℹ `amp44 = `%>%`(...)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue

  |                                                                            
  |..............                                                        |  20%
  ordinary text without R code


  |                                                                            
  |..............                                                        |  21%
label: exp-model (with options) 
List of 1
 $ warning: logi FALSE

Warning: don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
Warning: don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
Warning: don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
Warning: don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
Warning: don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue

  |                                                                            
  |...............                                                       |  22%
  ordinary text without R code


  |                                                                            
  |................                                                      |  22%
label: save-k

  |                                                                            
  |................                                                      |  23%
  ordinary text without R code


  |                                                                            
  |.................                                                     |  24%
label: chrom-model-bad

  |                                                                            
  |..................                                                    |  25%
  ordinary text without R code


  |                                                                            
  |..................                                                    |  26%
label: weak-inject-chrom-ampls

  |                                                                            
  |...................                                                   |  27%
  ordinary text without R code


  |                                                                            
  |...................                                                   |  28%
label: weak-inject-chrom-ampls-fit

  |                                                                            
  |....................                                                  |  28%
  ordinary text without R code


  |                                                                            
  |.....................                                                 |  29%
label: estimate_ampl_t0 (with options) 
List of 1
 $ warning: logi FALSE


  |                                                                            
  |.....................                                                 |  30%
  ordinary text without R code


  |                                                                            
  |......................                                                |  31%
label: amp44-measured-v-expected (with options) 
List of 2
 $ fig.width : num 15
 $ fig.height: num 8


  |                                                                            
  |......................                                                |  32%
  ordinary text without R code


  |                                                                            
  |.......................                                               |  33%
label: filter-out-bad-injects

  |                                                                            
  |........................                                              |  34%
  ordinary text without R code


label: plot-good-peaks (with options) 
List of 2
 $ fig.width : num 15
 $ fig.height: num 8


  |                                                                            
  |.........................                                             |  35%
  ordinary text without R code


  |                                                                            
  |.........................                                             |  36%
label: function-ampl-t0

  |                                                                            
  |..........................                                            |  37%
  ordinary text without R code


  |                                                                            
  |...........................                                           |  38%
label: count-peaks

  |                                                                            
  |...........................                                           |  39%
  ordinary text without R code


  |                                                                            
  |............................                                          |  40%
label: keep-min-4-peaks

  |                                                                            
  |............................                                          |  41%
  ordinary text without R code


  |                                                                            
  |.............................                                         |  41%
label: re-calc-ampl-t0 (with options) 
List of 1
 $ warning: logi FALSE

Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 1: file_id = "10067__5 min He purge 20180123 rep 1-0000.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 1: file_id = "10067__5 min He purge 20180123 rep 1-0000.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 1: file_id = "10067__5 min He purge 20180123 rep 1-0000.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 1: file_id = "10067__5 min He purge 20180123 rep 1-0000.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 1: file_id = "10067__5 min He purge 20180123 rep 1-0000.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 2: file_id = "10068__5 min He purge 20180123 rep 2-0000.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 2: file_id = "10068__5 min He purge 20180123 rep 2-0000.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 2: file_id = "10068__5 min He purge 20180123 rep 2-0000.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 2: file_id = "10068__5 min He purge 20180123 rep 2-0000.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 2: file_id = "10068__5 min He purge 20180123 rep 2-0000.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 3: file_id = "10069__5 min He purge 20180123 rep 3-0000.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 3: file_id = "10069__5 min He purge 20180123 rep 3-0000.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 3: file_id = "10069__5 min He purge 20180123 rep 3-0000.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 3: file_id = "10069__5 min He purge 20180123 rep 3-0000.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 3: file_id = "10069__5 min He purge 20180123 rep 3-0000.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 4: file_id = "10070__5 min He purge 20171108 rep 1-0000.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 4: file_id = "10070__5 min He purge 20171108 rep 1-0000.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 4: file_id = "10070__5 min He purge 20171108 rep 1-0000.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 4: file_id = "10070__5 min He purge 20171108 rep 1-0000.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 4: file_id = "10070__5 min He purge 20171108 rep 1-0000.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 5: file_id = "10071__5 min He purge 20171108 rep 2-0000.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 5: file_id = "10071__5 min He purge 20171108 rep 2-0000.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 5: file_id = "10071__5 min He purge 20171108 rep 2-0000.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 5: file_id = "10071__5 min He purge 20171108 rep 2-0000.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 5: file_id = "10071__5 min He purge 20171108 rep 2-0000.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 6: file_id = "10072__5 min He purge 20171108 rep 3-0000.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 6: file_id = "10072__5 min He purge 20171108 rep 3-0000.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 6: file_id = "10072__5 min He purge 20171108 rep 3-0000.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 6: file_id = "10072__5 min He purge 20171108 rep 3-0000.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 6: file_id = "10072__5 min He purge 20171108 rep 3-0000.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 7: file_id = "10073__1 ml milliQ acidified 20180123 RU YF rep 1-0000.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 7: file_id = "10073__1 ml milliQ acidified 20180123 RU YF rep 1-0000.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 7: file_id = "10073__1 ml milliQ acidified 20180123 RU YF rep 1-0000.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 7: file_id = "10073__1 ml milliQ acidified 20180123 RU YF rep 1-0000.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 7: file_id = "10073__1 ml milliQ acidified 20180123 RU YF rep 1-0000.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 8: file_id = "10074__1 ml milliQ acidified 20180123 RU YF rep 2-0000.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 8: file_id = "10074__1 ml milliQ acidified 20180123 RU YF rep 2-0000.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 8: file_id = "10074__1 ml milliQ acidified 20180123 RU YF rep 2-0000.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 8: file_id = "10074__1 ml milliQ acidified 20180123 RU YF rep 2-0000.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 8: file_id = "10074__1 ml milliQ acidified 20180123 RU YF rep 2-0000.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 9: file_id = "10075__1 ml milliQ acidified 20180123 RU YF rep 3-0000.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 9: file_id = "10075__1 ml milliQ acidified 20180123 RU YF rep 3-0000.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 9: file_id = "10075__1 ml milliQ acidified 20180123 RU YF rep 3-0000.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 9: file_id = "10075__1 ml milliQ acidified 20180123 RU YF rep 3-0000.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 9: file_id = "10075__1 ml milliQ acidified 20180123 RU YF rep 3-0000.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 10: file_id = "10076__1 ml milliQ acidified 20180227 RU YF rep 1-0000.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 10: file_id = "10076__1 ml milliQ acidified 20180227 RU YF rep 1-0000.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 10: file_id = "10076__1 ml milliQ acidified 20180227 RU YF rep 1-0000.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 10: file_id = "10076__1 ml milliQ acidified 20180227 RU YF rep 1-0000.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 10: file_id = "10076__1 ml milliQ acidified 20180227 RU YF rep 1-0000.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 11: file_id = "10077__1 ml milliQ acidified 20180227 RU YF rep 2-0000.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 11: file_id = "10077__1 ml milliQ acidified 20180227 RU YF rep 2-0000.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 11: file_id = "10077__1 ml milliQ acidified 20180227 RU YF rep 2-0000.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 11: file_id = "10077__1 ml milliQ acidified 20180227 RU YF rep 2-0000.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 12: file_id = "10078__1 ml milliQ acidified 20180227 RU YF rep 3-0000.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 12: file_id = "10078__1 ml milliQ acidified 20180227 RU YF rep 3-0000.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 12: file_id = "10078__1 ml milliQ acidified 20180227 RU YF rep 3-0000.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 12: file_id = "10078__1 ml milliQ acidified 20180227 RU YF rep 3-0000.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 12: file_id = "10078__1 ml milliQ acidified 20180227 RU YF rep 3-0000.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 13: file_id = "10079__28 ug YULE lin-0000.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 13: file_id = "10079__28 ug YULE lin-0000.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 13: file_id = "10079__28 ug YULE lin-0000.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 13: file_id = "10079__28 ug YULE lin-0000.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 14: file_id = "10080__49 ug YULE lin-0000.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 14: file_id = "10080__49 ug YULE lin-0000.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 14: file_id = "10080__49 ug YULE lin-0000.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 14: file_id = "10080__49 ug YULE lin-0000.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 15: file_id = "10081__92 ug YULE lin-0000.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 15: file_id = "10081__92 ug YULE lin-0000.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 15: file_id = "10081__92 ug YULE lin-0000.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 15: file_id = "10081__92 ug YULE lin-0000.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 16: file_id = "10082__163 ug YULE lin-0000.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 16: file_id = "10082__163 ug YULE lin-0000.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 16: file_id = "10082__163 ug YULE lin-0000.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 16: file_id = "10082__163 ug YULE lin-0000.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 16: file_id = "10082__163 ug YULE lin-0000.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 17: file_id = "10083__191 ug YULE lin-0000.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 17: file_id = "10083__191 ug YULE lin-0000.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 17: file_id = "10083__191 ug YULE lin-0000.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 17: file_id = "10083__191 ug YULE lin-0000.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 18: file_id = "10084__251 ug YULE lin-0000.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 18: file_id = "10084__251 ug YULE lin-0000.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 18: file_id = "10084__251 ug YULE lin-0000.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 18: file_id = "10084__251 ug YULE lin-0000.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 18: file_id = "10084__251 ug YULE lin-0000.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 19: file_id = "10085__301 ug YULE lin-0000.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 19: file_id = "10085__301 ug YULE lin-0000.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 19: file_id = "10085__301 ug YULE lin-0000.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 19: file_id = "10085__301 ug YULE lin-0000.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 19: file_id = "10085__301 ug YULE lin-0000.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 20: file_id = "10086__346 ug YULE lin-0000.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 20: file_id = "10086__346 ug YULE lin-0000.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 20: file_id = "10086__346 ug YULE lin-0000.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 20: file_id = "10086__346 ug YULE lin-0000.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 20: file_id = "10086__346 ug YULE lin-0000.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 21: file_id = "10087__407 ug YULE lin-0000.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 21: file_id = "10087__407 ug YULE lin-0000.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 21: file_id = "10087__407 ug YULE lin-0000.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 21: file_id = "10087__407 ug YULE lin-0000.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 21: file_id = "10087__407 ug YULE lin-0000.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 22: file_id = "10088__207 ug YULE drift1-0000.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 22: file_id = "10088__207 ug YULE drift1-0000.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 23: file_id = "10089__198 ug HIS mon1-0000.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 23: file_id = "10089__198 ug HIS mon1-0000.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 23: file_id = "10089__198 ug HIS mon1-0000.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 23: file_id = "10089__198 ug HIS mon1-0000.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 23: file_id = "10089__198 ug HIS mon1-0000.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 24: file_id = "10090__203 ug YULE dis1-0000.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 24: file_id = "10090__203 ug YULE dis1-0000.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 24: file_id = "10090__203 ug YULE dis1-0000.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 24: file_id = "10090__203 ug YULE dis1-0000.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 24: file_id = "10090__203 ug YULE dis1-0000.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 25: file_id = "10091__196 ug HIS dis2-0000.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 25: file_id = "10091__196 ug HIS dis2-0000.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 25: file_id = "10091__196 ug HIS dis2-0000.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 25: file_id = "10091__196 ug HIS dis2-0000.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 25: file_id = "10091__196 ug HIS dis2-0000.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 26: file_id = "10092__146 ug LSVEC dis3-0000.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 26: file_id = "10092__146 ug LSVEC dis3-0000.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 26: file_id = "10092__146 ug LSVEC dis3-0000.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 26: file_id = "10092__146 ug LSVEC dis3-0000.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 27: file_id = "10093__192 ug YULE drift2-0000.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 27: file_id = "10093__192 ug YULE drift2-0000.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 27: file_id = "10093__192 ug YULE drift2-0000.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 27: file_id = "10093__192 ug YULE drift2-0000.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 28: file_id = "10094__192 ug HIS mon2-0000.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 28: file_id = "10094__192 ug HIS mon2-0000.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 28: file_id = "10094__192 ug HIS mon2-0000.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 28: file_id = "10094__192 ug HIS mon2-0000.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 29: file_id = "10097__BA1A_5566 rep1-0000.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 29: file_id = "10097__BA1A_5566 rep1-0000.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 29: file_id = "10097__BA1A_5566 rep1-0000.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 29: file_id = "10097__BA1A_5566 rep1-0000.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 29: file_id = "10097__BA1A_5566 rep1-0000.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 30: file_id = "10098__BA1A_5566 rep2-0000.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 30: file_id = "10098__BA1A_5566 rep2-0000.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 30: file_id = "10098__BA1A_5566 rep2-0000.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 30: file_id = "10098__BA1A_5566 rep2-0000.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 30: file_id = "10098__BA1A_5566 rep2-0000.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 31: file_id = "10100__186 ug YULE drift3-0000.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 31: file_id = "10100__186 ug YULE drift3-0000.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 31: file_id = "10100__186 ug YULE drift3-0000.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 31: file_id = "10100__186 ug YULE drift3-0000.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 31: file_id = "10100__186 ug YULE drift3-0000.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 32: file_id = "10101__212 ug HIS mon3-0000.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 32: file_id = "10101__212 ug HIS mon3-0000.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 32: file_id = "10101__212 ug HIS mon3-0000.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 32: file_id = "10101__212 ug HIS mon3-0000.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 32: file_id = "10101__212 ug HIS mon3-0000.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 33: file_id = "10107__206 ug YULE drift4-0000.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 33: file_id = "10107__206 ug YULE drift4-0000.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 33: file_id = "10107__206 ug YULE drift4-0000.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 33: file_id = "10107__206 ug YULE drift4-0000.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 33: file_id = "10107__206 ug YULE drift4-0000.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 34: file_id = "10108__207 ug HIS mon4-0000.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 34: file_id = "10108__207 ug HIS mon4-0000.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 34: file_id = "10108__207 ug HIS mon4-0000.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 34: file_id = "10108__207 ug HIS mon4-0000.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 35: file_id = "10113__BA1A_100 rep1-0000.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 35: file_id = "10113__BA1A_100 rep1-0000.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 35: file_id = "10113__BA1A_100 rep1-0000.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 35: file_id = "10113__BA1A_100 rep1-0000.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 35: file_id = "10113__BA1A_100 rep1-0000.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 36: file_id = "10114__198 ug YULE drift5-0000.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 36: file_id = "10114__198 ug YULE drift5-0000.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 36: file_id = "10114__198 ug YULE drift5-0000.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 36: file_id = "10114__198 ug YULE drift5-0000.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 36: file_id = "10114__198 ug YULE drift5-0000.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 37: file_id = "10115__201 ug HIS drift5-0000.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 37: file_id = "10115__201 ug HIS drift5-0000.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 37: file_id = "10115__201 ug HIS drift5-0000.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 37: file_id = "10115__201 ug HIS drift5-0000.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 38: file_id = "10116__BA1A_100 rep2-0000.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 38: file_id = "10116__BA1A_100 rep2-0000.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 38: file_id = "10116__BA1A_100 rep2-0000.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 38: file_id = "10116__BA1A_100 rep2-0000.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 39: file_id = "10121__200 ug YULE drift6-0000.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 39: file_id = "10121__200 ug YULE drift6-0000.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 39: file_id = "10121__200 ug YULE drift6-0000.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 39: file_id = "10121__200 ug YULE drift6-0000.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 40: file_id = "10122__205 ug HIS mon6-0000.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 40: file_id = "10122__205 ug HIS mon6-0000.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 40: file_id = "10122__205 ug HIS mon6-0000.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 40: file_id = "10122__205 ug HIS mon6-0000.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 40: file_id = "10122__205 ug HIS mon6-0000.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 41: file_id = "10125__198 ug YULE drift7-0000.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 41: file_id = "10125__198 ug YULE drift7-0000.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 41: file_id = "10125__198 ug YULE drift7-0000.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 41: file_id = "10125__198 ug YULE drift7-0000.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 42: file_id = "10126__202 ug HIS mon7-0000.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 42: file_id = "10126__202 ug HIS mon7-0000.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 42: file_id = "10126__202 ug HIS mon7-0000.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 42: file_id = "10126__202 ug HIS mon7-0000.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 43: file_id = "10128__1 ml milliQ acidified 20180227 RU YF rep 5-0000.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 43: file_id = "10128__1 ml milliQ acidified 20180227 RU YF rep 5-0000.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 43: file_id = "10128__1 ml milliQ acidified 20180227 RU YF rep 5-0000.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 43: file_id = "10128__1 ml milliQ acidified 20180227 RU YF rep 5-0000.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 43: file_id = "10128__1 ml milliQ acidified 20180227 RU YF rep 5-0000.dxf".

  |                                                                            
  |..............................                                        |  42%
  ordinary text without R code


  |                                                                            
  |..............................                                        |  43%
label: summ-peaks (with options) 
List of 1
 $ warning: logi FALSE

Warning: don't know how to calculate <double> / <double in 'mV'>, converting to double without units to continue
Warning: don't know how to calculate <double> / <double in 'mV'>, converting to double without units to continue
Warning: don't know how to calculate <double> / <double in 'mV'>, converting to double without units to continue
Warning: don't know how to calculate <double> / <double in 'mV'>, converting to double without units to continue
Warning: don't know how to calculate <double> / <double in 'mV'>, converting to double without units to continue
Warning: don't know how to calculate <double> / <double in 'mV'>, converting to double without units to continue
Warning: don't know how to calculate <double> / <double in 'mV'>, converting to double without units to continue
Warning: don't know how to calculate <double> / <double in 'mV'>, converting to double without units to continue
Warning: don't know how to calculate <double> / <double in 'mV'>, converting to double without units to continue
Warning: don't know how to calculate <double> / <double in 'mV'>, converting to double without units to continue
Warning: don't know how to calculate <double> / <double in 'mV'>, converting to double without units to continue
Warning: don't know how to calculate <double> / <double in 'mV'>, converting to double without units to continue
Warning: don't know how to calculate <double> / <double in 'mV'>, converting to double without units to continue
Warning: don't know how to calculate <double> / <double in 'mV'>, converting to double without units to continue
Warning: don't know how to calculate <double> / <double in 'mV'>, converting to double without units to continue
Warning: don't know how to calculate <double> / <double in 'mV'>, converting to double without units to continue
Warning: don't know how to calculate <double> / <double in 'mV'>, converting to double without units to continue
Warning: don't know how to calculate <double> / <double in 'mV'>, converting to double without units to continue
Warning: don't know how to calculate <double> / <double in 'mV'>, converting to double without units to continue
Warning: don't know how to calculate <double> / <double in 'mV'>, converting to double without units to continue
Warning: don't know how to calculate <double> / <double in 'mV'>, converting to double without units to continue
Warning: don't know how to calculate <double> / <double in 'mV'>, converting to double without units to continue
Warning: don't know how to calculate <double> / <double in 'mV'>, converting to double without units to continue
Warning: don't know how to calculate <double> / <double in 'mV'>, converting to double without units to continue
Warning: don't know how to calculate <double> / <double in 'mV'>, converting to double without units to continue
Warning: don't know how to calculate <double> / <double in 'mV'>, converting to double without units to continue
Warning: don't know how to calculate <double> / <double in 'mV'>, converting to double without units to continue
Warning: don't know how to calculate <double> / <double in 'mV'>, converting to double without units to continue
Warning: don't know how to calculate <double> / <double in 'mV'>, converting to double without units to continue
Warning: don't know how to calculate <double> / <double in 'mV'>, converting to double without units to continue
Warning: don't know how to calculate <double> / <double in 'mV'>, converting to double without units to continue
Warning: don't know how to calculate <double> / <double in 'mV'>, converting to double without units to continue
Warning: don't know how to calculate <double> / <double in 'mV'>, converting to double without units to continue
Warning: don't know how to calculate <double> / <double in 'mV'>, converting to double without units to continue
Warning: don't know how to calculate <double> / <double in 'mV'>, converting to double without units to continue
Warning: don't know how to calculate <double> / <double in 'mV'>, converting to double without units to continue
Warning: don't know how to calculate <double> / <double in 'mV'>, converting to double without units to continue
Warning: don't know how to calculate <double> / <double in 'mV'>, converting to double without units to continue
Warning: don't know how to calculate <double> / <double in 'mV'>, converting to double without units to continue
Warning: don't know how to calculate <double> / <double in 'mV'>, converting to double without units to continue
Warning: don't know how to calculate <double> / <double in 'mV'>, converting to double without units to continue
Warning: don't know how to calculate <double> / <double in 'mV'>, converting to double without units to continue
Warning: don't know how to calculate <double> / <double in 'mV'>, converting to double without units to continue

  |                                                                            
  |...............................                                       |  44%
  ordinary text without R code


  |                                                                            
  |...............................                                       |  45%
label: mutate-data-type

  |                                                                            
  |................................                                      |  46%
  ordinary text without R code


  |                                                                            
  |.................................                                     |  47%
label: calc-LOQ

  ordinary text without R code


  |                                                                            
  |..................................                                    |  48%
label: make-units-explicit

  |                                                                            
  |..................................                                    |  49%
  ordinary text without R code


  |                                                                            
  |...................................                                   |  50%
label: check-if-quantitatable

  |                                                                            
  |....................................                                  |  51%
  ordinary text without R code


  |                                                                            
  |....................................                                  |  52%
label: input-sample-params

  |                                                                            
  |.....................................                                 |  53%
  ordinary text without R code


label: select-stnds

  |                                                                            
  |......................................                                |  54%
  ordinary text without R code


  |                                                                            
  |.......................................                               |  55%
label: plot-calib-mass-loaded

  |                                                                            
  |.......................................                               |  56%
  ordinary text without R code


  |                                                                            
  |........................................                              |  57%
label: chrom-bad-stnd

  |                                                                            
  |........................................                              |  58%
  ordinary text without R code


  |                                                                            
  |.........................................                             |  59%
label: cull-bad-stnd

  |                                                                            
  |..........................................                            |  59%
  ordinary text without R code


  |                                                                            
  |..........................................                            |  60%
label: plot-calib-mass-loaded-culled

  |                                                                            
  |...........................................                           |  61%
  ordinary text without R code


  |                                                                            
  |...........................................                           |  62%
label: constants

  |                                                                            
  |............................................                          |  63%
  ordinary text without R code


  |                                                                            
  |.............................................                         |  64%
label: calc-pCO2-expected

  |                                                                            
  |.............................................                         |  65%
  ordinary text without R code


  |                                                                            
  |..............................................                        |  66%
label: plot-calib-pCO2

  ordinary text without R code


  |                                                                            
  |...............................................                       |  67%
label: regress-calib-pCO2

  |                                                                            
  |................................................                      |  68%
  ordinary text without R code


  |                                                                            
  |................................................                      |  69%
label: filter-for-samples

  |                                                                            
  |.................................................                     |  70%
  ordinary text without R code


  |                                                                            
  |.................................................                     |  71%
label: apply-conc-calib

  |                                                                            
  |..................................................                    |  72%
  ordinary text without R code


  |                                                                            
  |...................................................                   |  72%
label: plot-calib-CaCO3

  |                                                                            
  |...................................................                   |  73%
  ordinary text without R code


  |                                                                            
  |....................................................                  |  74%
label: calc-DIC-conc

  |                                                                            
  |....................................................                  |  75%
  ordinary text without R code


  |                                                                            
  |.....................................................                 |  76%
label: amp44-DIC-sample-stnd-check

  |                                                                            
  |......................................................                |  77%
  ordinary text without R code


  |                                                                            
  |......................................................                |  78%
label: plot-summary-reproducibility-d13C

  |                                                                            
  |.......................................................               |  78%
  ordinary text without R code


  |                                                                            
  |........................................................              |  79%
label: cull-bad-reproducibility-d13C

  |                                                                            
  |........................................................              |  80%
  ordinary text without R code


  |                                                                            
  |.........................................................             |  81%
label: plot-yields-d13C (with options) 
List of 2
 $ fig.height: num 8
 $ fig.width : num 10


  |                                                                            
  |.........................................................             |  82%
  ordinary text without R code


  |                                                                            
  |..........................................................            |  83%
label: load-isotope-stnds

  |                                                                            
  |...........................................................           |  84%
  ordinary text without R code


label: add-isotope-stnds

  |                                                                            
  |............................................................          |  85%
  ordinary text without R code


  |                                                                            
  |............................................................          |  86%
label: generate-calib-d13C

  |                                                                            
  |.............................................................         |  87%
  ordinary text without R code


  |                                                                            
  |..............................................................        |  88%
label: calib-coeffs (with options) 
List of 2
 $ fig.width : num 7
 $ fig.height: num 8


  |                                                                            
  |..............................................................        |  89%
  ordinary text without R code


  |                                                                            
  |...............................................................       |  90%
label: visualize-calib-params (with options) 
List of 3
 $ fig.width : num 8
 $ fig.height: num 11
 $ message   : logi FALSE


  |                                                                            
  |...............................................................       |  91%
  ordinary text without R code


  |                                                                            
  |................................................................      |  91%
label: apply-global-calib (with options) 
List of 1
 $ cache: logi TRUE


  |                                                                            
  |.................................................................     |  92%
  ordinary text without R code


  |                                                                            
  |.................................................................     |  93%
label: plot-calib-range (with options) 
List of 2
 $ fig.width : num 7
 $ fig.height: num 9


  |                                                                            
  |..................................................................    |  94%
  ordinary text without R code


  |                                                                            
  |..................................................................    |  95%
label: summary-d13C

  |                                                                            
  |...................................................................   |  96%
  ordinary text without R code


  |                                                                            
  |....................................................................  |  97%
label: summary-d13C-conc

  ordinary text without R code


  |                                                                            
  |..................................................................... |  98%
label: summary-d13C-conc-LOQ

  |                                                                            
  |..................................................................... |  99%
  ordinary text without R code


  |                                                                            
  |......................................................................| 100%
label: export

output file: 180228_OM18_DIC.knit.md

/usr/local/bin/pandoc +RTS -K512m -RTS 180228_OM18_DIC.knit.md --to html4 --from markdown+autolink_bare_uris+tex_math_single_backslash --output docs/rmarkdown/180228_OM18_DIC.html --lua-filter /Library/Frameworks/R.framework/Versions/4.1/Resources/library/rmarkdown/rmarkdown/lua/pagebreak.lua --lua-filter /Library/Frameworks/R.framework/Versions/4.1/Resources/library/rmarkdown/rmarkdown/lua/latex-div.lua --self-contained --variable bs3=TRUE --standalone --section-divs --table-of-contents --toc-depth 3 --variable toc_float=1 --variable toc_selectors=h1,h2,h3 --variable toc_collapsed=1 --variable toc_smooth_scroll=1 --variable toc_print=1 --template /Library/Frameworks/R.framework/Versions/4.1/Resources/library/rmarkdown/rmd/h/default.html --no-highlight --variable highlightjs=1 --number-sections --variable theme=bootstrap --css /Users/melo.d/Desktop/Research/thesis_prep/manuscripts/Oman-packers-2018-2019/Oman-packers-2018-2019/stylesheet.css --include-in-header /var/folders/pw/9fk_chms0jl85nfldy5rgfyc0000gn/T//RtmpWa0f9W/rmarkdown-str163ed7208ef3d.html --mathjax --variable 'mathjax-url:https://mathjax.rstudio.com/latest/MathJax.js?config=TeX-AMS-MML_HTMLorMML' --variable code_folding=show --variable code_menu=1 

Output created: docs/rmarkdown/180228_OM18_DIC.html

180306_OM18_DIC.Rmd (OK)



processing file: 180306_OM18_DIC.Rmd

  |                                                                            
  |                                                                      |   0%
  |                                                                            
  |.                                                                     |   1%
   inline R code fragments


  |                                                                            
  |.                                                                     |   2%
label: setup (with options) 
List of 2
 $ warning: logi FALSE
 $ message: logi FALSE

── Attaching packages ─────────────────────────────────────── tidyverse 1.3.1 ──
✓ ggplot2 3.3.5     ✓ purrr   0.3.4
✓ tibble  3.1.2     ✓ dplyr   1.0.7
✓ tidyr   1.1.3     ✓ stringr 1.4.0
✓ readr   2.0.0     ✓ forcats 0.5.1
── Conflicts ────────────────────────────────────────── tidyverse_conflicts() ──
x dplyr::filter() masks stats::filter()
x dplyr::lag()    masks stats::lag()

Attaching package: 'isoreader'

The following object is masked from 'package:stats':

    filter


Attaching package: 'isoprocessor'

The following objects are masked from 'package:isoreader':

    iso_calculate_ratios, iso_convert_signals, iso_convert_time,
    iso_plot_continuous_flow_data, iso_plot_dual_inlet_data,
    iso_plot_raw_data

The following object is masked from 'package:stats':

    filter


Attaching package: 'plotly'

The following object is masked from 'package:ggplot2':

    last_plot

The following object is masked from 'package:stats':

    filter

The following object is masked from 'package:graphics':

    layout

Loading required package: ggpp

Attaching package: 'ggpp'

The following object is masked from 'package:ggplot2':

    annotate


  |                                                                            
  |..                                                                    |   3%
   inline R code fragments


  |                                                                            
  |...                                                                   |   4%
label: load-data (with options) 
List of 1
 $ message: logi FALSE

Info: preparing to read 1 data files (all will be cached), setting up 1 par...
Info (process 1): reading file 'data_raw/180306_DBN_DIC/180306_DBN_DIC_data...
Info (process 1): loaded 38 data files from R Data Storage
Info: finished reading 1 files in 2.80 secs

  |                                                                            
  |...                                                                   |   5%
  ordinary text without R code


  |                                                                            
  |....                                                                  |   5%
label: process-file-info

  |                                                                            
  |....                                                                  |   6%
  ordinary text without R code


  |                                                                            
  |.....                                                                 |   7%
label: chroms

  |                                                                            
  |......                                                                |   8%
  ordinary text without R code


  |                                                                            
  |......                                                                |   9%
label: peak-maps

  |                                                                            
  |.......                                                               |  10%
  ordinary text without R code


  |                                                                            
  |........                                                              |  11%
label: peak-table

  |                                                                            
  |........                                                              |  12%
  ordinary text without R code


  |                                                                            
  |.........                                                             |  13%
label: chrom-labeled (with options) 
List of 1
 $ fig.height: num 5


  |                                                                            
  |..........                                                            |  14%
  ordinary text without R code


  |                                                                            
  |..........                                                            |  15%
label: select-analyte-peaks

  |                                                                            
  |...........                                                           |  15%
  ordinary text without R code


  |                                                                            
  |...........                                                           |  16%
label: mutate-transfer-t

  |                                                                            
  |............                                                          |  17%
  ordinary text without R code


  |                                                                            
  |.............                                                         |  18%
label: chrom-model-good

  |                                                                            
  |.............                                                         |  19%
  ordinary text without R code


  |                                                                            
  |..............                                                        |  20%
label: chrom-training (with options) 
List of 1
 $ warning: logi FALSE

Warning: Problem with `mutate()` column `amp44`.
ℹ `amp44 = `%>%`(...)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
Warning: Problem with `mutate()` column `amp44`.
ℹ `amp44 = `%>%`(...)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
Warning: Problem with `mutate()` column `amp44`.
ℹ `amp44 = `%>%`(...)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
Warning: Problem with `mutate()` column `amp44`.
ℹ `amp44 = `%>%`(...)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue

  |                                                                            
  |...............                                                       |  21%
  ordinary text without R code


  |                                                                            
  |...............                                                       |  22%
label: exp-model (with options) 
List of 1
 $ warning: logi FALSE

Warning: don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
Warning: don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
Warning: don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
Warning: don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue

  |                                                                            
  |................                                                      |  23%
  ordinary text without R code


  |                                                                            
  |.................                                                     |  24%
label: save-k

  |                                                                            
  |.................                                                     |  25%
  ordinary text without R code


  |                                                                            
  |..................                                                    |  25%
label: chrom-model-bad

  |                                                                            
  |..................                                                    |  26%
  ordinary text without R code


  |                                                                            
  |...................                                                   |  27%
label: weak-inject-chrom-ampls

  |                                                                            
  |....................                                                  |  28%
  ordinary text without R code


  |                                                                            
  |....................                                                  |  29%
label: weak-inject-chrom-ampls-fit

  |                                                                            
  |.....................                                                 |  30%
  ordinary text without R code


  |                                                                            
  |......................                                                |  31%
label: estimate_ampl_t0 (with options) 
List of 1
 $ warning: logi FALSE


  |                                                                            
  |......................                                                |  32%
  ordinary text without R code


  |                                                                            
  |.......................                                               |  33%
label: amp44-measured-v-expected (with options) 
List of 2
 $ fig.width : num 15
 $ fig.height: num 8


  |                                                                            
  |........................                                              |  34%
  ordinary text without R code


  |                                                                            
  |........................                                              |  35%
label: filter-out-bad-injects

  |                                                                            
  |.........................                                             |  35%
  ordinary text without R code


  |                                                                            
  |.........................                                             |  36%
label: plot-good-peaks (with options) 
List of 2
 $ fig.width : num 15
 $ fig.height: num 8


  |                                                                            
  |..........................                                            |  37%
  ordinary text without R code


  |                                                                            
  |...........................                                           |  38%
label: function-ampl-t0

  |                                                                            
  |...........................                                           |  39%
  ordinary text without R code


  |                                                                            
  |............................                                          |  40%
label: count-peaks

  |                                                                            
  |.............................                                         |  41%
  ordinary text without R code


  |                                                                            
  |.............................                                         |  42%
label: keep-min-4-peaks

  |                                                                            
  |..............................                                        |  43%
  ordinary text without R code


  |                                                                            
  |...............................                                       |  44%
label: re-calc-ampl-t0 (with options) 
List of 1
 $ warning: logi FALSE

Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 1: file_id = "10212__30 min He purge 20180304 rep 1-0000.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 1: file_id = "10212__30 min He purge 20180304 rep 1-0000.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 1: file_id = "10212__30 min He purge 20180304 rep 1-0000.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 1: file_id = "10212__30 min He purge 20180304 rep 1-0000.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 2: file_id = "10217__50 ml boiled kopf milliQ 20180304 + 5 ml boiled 85% H3PO4 RU YF rep 2-0000.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 2: file_id = "10217__50 ml boiled kopf milliQ 20180304 + 5 ml boiled 85% H3PO4 RU YF rep 2-0000.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 2: file_id = "10217__50 ml boiled kopf milliQ 20180304 + 5 ml boiled 85% H3PO4 RU YF rep 2-0000.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 2: file_id = "10217__50 ml boiled kopf milliQ 20180304 + 5 ml boiled 85% H3PO4 RU YF rep 2-0000.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 3: file_id = "10218__50 ml boiled kopf milliQ 20180124 + 5 ml boiled 85% H3PO4 RU YF rep 1-0000.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 3: file_id = "10218__50 ml boiled kopf milliQ 20180124 + 5 ml boiled 85% H3PO4 RU YF rep 1-0000.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 3: file_id = "10218__50 ml boiled kopf milliQ 20180124 + 5 ml boiled 85% H3PO4 RU YF rep 1-0000.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 3: file_id = "10218__50 ml boiled kopf milliQ 20180124 + 5 ml boiled 85% H3PO4 RU YF rep 1-0000.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 3: file_id = "10218__50 ml boiled kopf milliQ 20180124 + 5 ml boiled 85% H3PO4 RU YF rep 1-0000.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 4: file_id = "10219__50 ml boiled kopf milliQ 20180124 + 5 ml boiled 85% H3PO4 RU YF rep 2-0000.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 4: file_id = "10219__50 ml boiled kopf milliQ 20180124 + 5 ml boiled 85% H3PO4 RU YF rep 2-0000.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 4: file_id = "10219__50 ml boiled kopf milliQ 20180124 + 5 ml boiled 85% H3PO4 RU YF rep 2-0000.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 4: file_id = "10219__50 ml boiled kopf milliQ 20180124 + 5 ml boiled 85% H3PO4 RU YF rep 2-0000.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 4: file_id = "10219__50 ml boiled kopf milliQ 20180124 + 5 ml boiled 85% H3PO4 RU YF rep 2-0000.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 5: file_id = "10222__146 ug YULE drift1 re-run-0000.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 5: file_id = "10222__146 ug YULE drift1 re-run-0000.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 5: file_id = "10222__146 ug YULE drift1 re-run-0000.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 5: file_id = "10222__146 ug YULE drift1 re-run-0000.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 6: file_id = "10223__154 ug HIS mon1-0000.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 6: file_id = "10223__154 ug HIS mon1-0000.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 6: file_id = "10223__154 ug HIS mon1-0000.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 6: file_id = "10223__154 ug HIS mon1-0000.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 7: file_id = "10224__107 ug LSVEC dis-0000.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 7: file_id = "10224__107 ug LSVEC dis-0000.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 7: file_id = "10224__107 ug LSVEC dis-0000.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 7: file_id = "10224__107 ug LSVEC dis-0000.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 7: file_id = "10224__107 ug LSVEC dis-0000.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 8: file_id = "10225__107 ug LSVEC dis-0000.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 8: file_id = "10225__107 ug LSVEC dis-0000.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 8: file_id = "10225__107 ug LSVEC dis-0000.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 8: file_id = "10225__107 ug LSVEC dis-0000.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 9: file_id = "10226__13 ug YULE lin-0000.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 9: file_id = "10226__13 ug YULE lin-0000.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 9: file_id = "10226__13 ug YULE lin-0000.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 9: file_id = "10226__13 ug YULE lin-0000.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 10: file_id = "10227__19 ug YULE lin-0000.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 10: file_id = "10227__19 ug YULE lin-0000.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 10: file_id = "10227__19 ug YULE lin-0000.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 10: file_id = "10227__19 ug YULE lin-0000.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 11: file_id = "10228__28 ug YULE lin-0000.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 11: file_id = "10228__28 ug YULE lin-0000.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 11: file_id = "10228__28 ug YULE lin-0000.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 11: file_id = "10228__28 ug YULE lin-0000.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 12: file_id = "10229__47 ug YULE lin-0000.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 12: file_id = "10229__47 ug YULE lin-0000.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 12: file_id = "10229__47 ug YULE lin-0000.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 12: file_id = "10229__47 ug YULE lin-0000.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 12: file_id = "10229__47 ug YULE lin-0000.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 13: file_id = "10230__101 ug YULE lin-0000.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 13: file_id = "10230__101 ug YULE lin-0000.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 13: file_id = "10230__101 ug YULE lin-0000.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 13: file_id = "10230__101 ug YULE lin-0000.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 13: file_id = "10230__101 ug YULE lin-0000.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 14: file_id = "10231__151 ug YULE lin-0000.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 14: file_id = "10231__151 ug YULE lin-0000.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 14: file_id = "10231__151 ug YULE lin-0000.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 15: file_id = "10234__245 ug YULE lin re-run-0000.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 15: file_id = "10234__245 ug YULE lin re-run-0000.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 15: file_id = "10234__245 ug YULE lin re-run-0000.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 15: file_id = "10234__245 ug YULE lin re-run-0000.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 16: file_id = "10235__363 ug YULE lin-0000.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 16: file_id = "10235__363 ug YULE lin-0000.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 16: file_id = "10235__363 ug YULE lin-0000.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 16: file_id = "10235__363 ug YULE lin-0000.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 17: file_id = "10236__506 ug YULE lin-0000.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 17: file_id = "10236__506 ug YULE lin-0000.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 17: file_id = "10236__506 ug YULE lin-0000.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 17: file_id = "10236__506 ug YULE lin-0000.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 18: file_id = "10237__975 ug YULE lin-0000.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 18: file_id = "10237__975 ug YULE lin-0000.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 18: file_id = "10237__975 ug YULE lin-0000.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 18: file_id = "10237__975 ug YULE lin-0000.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 19: file_id = "10240__148 ug HIS mon2-0000.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 19: file_id = "10240__148 ug HIS mon2-0000.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 19: file_id = "10240__148 ug HIS mon2-0000.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 19: file_id = "10240__148 ug HIS mon2-0000.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 20: file_id = "10245__BA1A_100 rep1-0000.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 20: file_id = "10245__BA1A_100 rep1-0000.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 20: file_id = "10245__BA1A_100 rep1-0000.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 20: file_id = "10245__BA1A_100 rep1-0000.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 20: file_id = "10245__BA1A_100 rep1-0000.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 21: file_id = "10246__144 ug YULE drift3-0000.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 21: file_id = "10246__144 ug YULE drift3-0000.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 21: file_id = "10246__144 ug YULE drift3-0000.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 21: file_id = "10246__144 ug YULE drift3-0000.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 22: file_id = "10247__151 ug HIS mon3-0000.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 22: file_id = "10247__151 ug HIS mon3-0000.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 22: file_id = "10247__151 ug HIS mon3-0000.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 22: file_id = "10247__151 ug HIS mon3-0000.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 23: file_id = "10248__BA1A_100 rep2-0000.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 23: file_id = "10248__BA1A_100 rep2-0000.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 23: file_id = "10248__BA1A_100 rep2-0000.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 23: file_id = "10248__BA1A_100 rep2-0000.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 24: file_id = "10253__144 ug YULE drift4-0000.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 24: file_id = "10253__144 ug YULE drift4-0000.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 24: file_id = "10253__144 ug YULE drift4-0000.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 24: file_id = "10253__144 ug YULE drift4-0000.dxf".

  |                                                                            
  |...............................                                       |  45%
  ordinary text without R code


  |                                                                            
  |................................                                      |  45%
label: summ-peaks (with options) 
List of 1
 $ warning: logi FALSE

Warning: don't know how to calculate <double> / <double in 'mV'>, converting to double without units to continue
Warning: don't know how to calculate <double> / <double in 'mV'>, converting to double without units to continue
Warning: don't know how to calculate <double> / <double in 'mV'>, converting to double without units to continue
Warning: don't know how to calculate <double> / <double in 'mV'>, converting to double without units to continue
Warning: don't know how to calculate <double> / <double in 'mV'>, converting to double without units to continue
Warning: don't know how to calculate <double> / <double in 'mV'>, converting to double without units to continue
Warning: don't know how to calculate <double> / <double in 'mV'>, converting to double without units to continue
Warning: don't know how to calculate <double> / <double in 'mV'>, converting to double without units to continue
Warning: don't know how to calculate <double> / <double in 'mV'>, converting to double without units to continue
Warning: don't know how to calculate <double> / <double in 'mV'>, converting to double without units to continue
Warning: don't know how to calculate <double> / <double in 'mV'>, converting to double without units to continue
Warning: don't know how to calculate <double> / <double in 'mV'>, converting to double without units to continue
Warning: don't know how to calculate <double> / <double in 'mV'>, converting to double without units to continue
Warning: don't know how to calculate <double> / <double in 'mV'>, converting to double without units to continue
Warning: don't know how to calculate <double> / <double in 'mV'>, converting to double without units to continue
Warning: don't know how to calculate <double> / <double in 'mV'>, converting to double without units to continue
Warning: don't know how to calculate <double> / <double in 'mV'>, converting to double without units to continue
Warning: don't know how to calculate <double> / <double in 'mV'>, converting to double without units to continue
Warning: don't know how to calculate <double> / <double in 'mV'>, converting to double without units to continue
Warning: don't know how to calculate <double> / <double in 'mV'>, converting to double without units to continue
Warning: don't know how to calculate <double> / <double in 'mV'>, converting to double without units to continue
Warning: don't know how to calculate <double> / <double in 'mV'>, converting to double without units to continue
Warning: don't know how to calculate <double> / <double in 'mV'>, converting to double without units to continue
Warning: don't know how to calculate <double> / <double in 'mV'>, converting to double without units to continue

  |                                                                            
  |................................                                      |  46%
  ordinary text without R code


  |                                                                            
  |.................................                                     |  47%
label: mutate-data-type

  |                                                                            
  |..................................                                    |  48%
  ordinary text without R code


  |                                                                            
  |..................................                                    |  49%
label: calc-LOQ

  |                                                                            
  |...................................                                   |  50%
  ordinary text without R code


  |                                                                            
  |....................................                                  |  51%
label: make-units-explicit

  |                                                                            
  |....................................                                  |  52%
  ordinary text without R code


  |                                                                            
  |.....................................                                 |  53%
label: check-if-quantitatable

  |                                                                            
  |......................................                                |  54%
  ordinary text without R code


  |                                                                            
  |......................................                                |  55%
label: input-sample-params

  |                                                                            
  |.......................................                               |  55%
  ordinary text without R code


  |                                                                            
  |.......................................                               |  56%
label: select-stnds

  |                                                                            
  |........................................                              |  57%
  ordinary text without R code


  |                                                                            
  |.........................................                             |  58%
label: plot-calib-mass-loaded

  |                                                                            
  |.........................................                             |  59%
  ordinary text without R code


  |                                                                            
  |..........................................                            |  60%
label: constants

  |                                                                            
  |...........................................                           |  61%
  ordinary text without R code


  |                                                                            
  |...........................................                           |  62%
label: calc-pCO2-expected

  |                                                                            
  |............................................                          |  63%
  ordinary text without R code


  |                                                                            
  |.............................................                         |  64%
label: plot-calib-pCO2

  |                                                                            
  |.............................................                         |  65%
  ordinary text without R code


  |                                                                            
  |..............................................                        |  65%
label: regress-calib-pCO2

  |                                                                            
  |..............................................                        |  66%
  ordinary text without R code


  |                                                                            
  |...............................................                       |  67%
label: filter-for-samples

  |                                                                            
  |................................................                      |  68%
  ordinary text without R code


  |                                                                            
  |................................................                      |  69%
label: apply-conc-calib

  |                                                                            
  |.................................................                     |  70%
  ordinary text without R code


  |                                                                            
  |..................................................                    |  71%
label: plot-calib-CaCO3

  |                                                                            
  |..................................................                    |  72%
  ordinary text without R code


  |                                                                            
  |...................................................                   |  73%
label: calc-DIC-conc

  |                                                                            
  |....................................................                  |  74%
  ordinary text without R code


  |                                                                            
  |....................................................                  |  75%
label: amp44-DIC-sample-stnd-check

  |                                                                            
  |.....................................................                 |  75%
  ordinary text without R code


  |                                                                            
  |.....................................................                 |  76%
label: plot-summary-reproducibility-d13C

  |                                                                            
  |......................................................                |  77%
  ordinary text without R code


  |                                                                            
  |.......................................................               |  78%
label: cull-bad-reproducibility-d13C

  |                                                                            
  |.......................................................               |  79%
  ordinary text without R code


  |                                                                            
  |........................................................              |  80%
label: plot-yields-d13C (with options) 
List of 2
 $ fig.height: num 8
 $ fig.width : num 10


  |                                                                            
  |.........................................................             |  81%
  ordinary text without R code


  |                                                                            
  |.........................................................             |  82%
label: cull-d13C-stnds (with options) 
List of 2
 $ fig.height: num 8
 $ fig.width : num 10


  |                                                                            
  |..........................................................            |  83%
  ordinary text without R code


  |                                                                            
  |...........................................................           |  84%
label: load-isotope-stnds

  |                                                                            
  |...........................................................           |  85%
  ordinary text without R code


  |                                                                            
  |............................................................          |  85%
label: add-isotope-stnds

  |                                                                            
  |............................................................          |  86%
  ordinary text without R code


  |                                                                            
  |.............................................................         |  87%
label: generate-calib-d13C

  |                                                                            
  |..............................................................        |  88%
  ordinary text without R code


  |                                                                            
  |..............................................................        |  89%
label: calib-coeffs (with options) 
List of 2
 $ fig.width : num 7
 $ fig.height: num 8


  |                                                                            
  |...............................................................       |  90%
  ordinary text without R code


  |                                                                            
  |................................................................      |  91%
label: visualize-calib-params (with options) 
List of 3
 $ fig.width : num 8
 $ fig.height: num 11
 $ message   : logi FALSE


  |                                                                            
  |................................................................      |  92%
  ordinary text without R code


  |                                                                            
  |.................................................................     |  93%
label: apply-global-calib (with options) 
List of 1
 $ cache: logi TRUE


  |                                                                            
  |..................................................................    |  94%
  ordinary text without R code


  |                                                                            
  |..................................................................    |  95%
label: plot-calib-range (with options) 
List of 2
 $ fig.width : num 7
 $ fig.height: num 9


  |                                                                            
  |...................................................................   |  95%
  ordinary text without R code


  |                                                                            
  |...................................................................   |  96%
label: summary-d13C

  |                                                                            
  |....................................................................  |  97%
  ordinary text without R code


  |                                                                            
  |..................................................................... |  98%
label: summary-d13C-conc

  |                                                                            
  |..................................................................... |  99%
  ordinary text without R code


  |                                                                            
  |......................................................................| 100%
label: export

output file: 180306_OM18_DIC.knit.md

/usr/local/bin/pandoc +RTS -K512m -RTS 180306_OM18_DIC.knit.md --to html4 --from markdown+autolink_bare_uris+tex_math_single_backslash --output docs/rmarkdown/180306_OM18_DIC.html --lua-filter /Library/Frameworks/R.framework/Versions/4.1/Resources/library/rmarkdown/rmarkdown/lua/pagebreak.lua --lua-filter /Library/Frameworks/R.framework/Versions/4.1/Resources/library/rmarkdown/rmarkdown/lua/latex-div.lua --self-contained --variable bs3=TRUE --standalone --section-divs --table-of-contents --toc-depth 3 --variable toc_float=1 --variable toc_selectors=h1,h2,h3 --variable toc_collapsed=1 --variable toc_smooth_scroll=1 --variable toc_print=1 --template /Library/Frameworks/R.framework/Versions/4.1/Resources/library/rmarkdown/rmd/h/default.html --no-highlight --variable highlightjs=1 --number-sections --variable theme=bootstrap --css /Users/melo.d/Desktop/Research/thesis_prep/manuscripts/Oman-packers-2018-2019/Oman-packers-2018-2019/stylesheet.css --include-in-header /var/folders/pw/9fk_chms0jl85nfldy5rgfyc0000gn/T//RtmpNcA6RW/rmarkdown-str1652167c2f3ea.html --mathjax --variable 'mathjax-url:https://mathjax.rstudio.com/latest/MathJax.js?config=TeX-AMS-MML_HTMLorMML' --variable code_folding=show --variable code_menu=1 

Output created: docs/rmarkdown/180306_OM18_DIC.html

190208_OM19_DIC.Rmd (OK)



processing file: 190208_OM19_DIC.Rmd

  |                                                                            
  |                                                                      |   0%
  |                                                                            
  |.                                                                     |   1%
   inline R code fragments


  |                                                                            
  |.                                                                     |   2%
label: setup (with options) 
List of 2
 $ warning: logi FALSE
 $ message: logi FALSE

── Attaching packages ─────────────────────────────────────── tidyverse 1.3.1 ──
✓ ggplot2 3.3.5     ✓ purrr   0.3.4
✓ tibble  3.1.2     ✓ dplyr   1.0.7
✓ tidyr   1.1.3     ✓ stringr 1.4.0
✓ readr   2.0.0     ✓ forcats 0.5.1
── Conflicts ────────────────────────────────────────── tidyverse_conflicts() ──
x dplyr::filter() masks stats::filter()
x dplyr::lag()    masks stats::lag()

Attaching package: 'isoreader'

The following object is masked from 'package:stats':

    filter


Attaching package: 'isoprocessor'

The following objects are masked from 'package:isoreader':

    iso_calculate_ratios, iso_convert_signals, iso_convert_time,
    iso_plot_continuous_flow_data, iso_plot_dual_inlet_data,
    iso_plot_raw_data

The following object is masked from 'package:stats':

    filter


Attaching package: 'plotly'

The following object is masked from 'package:ggplot2':

    last_plot

The following object is masked from 'package:stats':

    filter

The following object is masked from 'package:graphics':

    layout

Loading required package: ggpp

Attaching package: 'ggpp'

The following object is masked from 'package:ggplot2':

    annotate


  |                                                                            
  |..                                                                    |   2%
   inline R code fragments


  |                                                                            
  |..                                                                    |   3%
label: load-data (with options) 
List of 1
 $ message: logi FALSE

Info: preparing to read 1 data files (all will be cached), setting up 1 par...
Info (process 1): reading file 'data_raw/190208_DBN_DIC/190208_DBN_DIC_data...
Info (process 1): loaded 33 data files from R Data Storage
Info: finished reading 1 files in 2.77 secs

  |                                                                            
  |...                                                                   |   4%
  ordinary text without R code


  |                                                                            
  |...                                                                   |   5%
label: process-file-info

  |                                                                            
  |....                                                                  |   6%
  ordinary text without R code


  |                                                                            
  |.....                                                                 |   7%
label: chroms

  ordinary text without R code


  |                                                                            
  |......                                                                |   8%
label: peak-maps

  |                                                                            
  |......                                                                |   9%
  ordinary text without R code


  |                                                                            
  |.......                                                               |  10%
label: peak-table

  |                                                                            
  |.......                                                               |  11%
  ordinary text without R code


  |                                                                            
  |........                                                              |  11%
label: chrom-labeled (with options) 
List of 1
 $ fig.height: num 5


  |                                                                            
  |.........                                                             |  12%
  ordinary text without R code


  |                                                                            
  |.........                                                             |  13%
label: select-analyte-peaks

  |                                                                            
  |..........                                                            |  14%
  ordinary text without R code


  |                                                                            
  |..........                                                            |  15%
label: mutate-transfer-t

  |                                                                            
  |...........                                                           |  16%
  ordinary text without R code


label: chrom-model-good

  |                                                                            
  |............                                                          |  17%
  ordinary text without R code


  |                                                                            
  |.............                                                         |  18%
label: chrom-training (with options) 
List of 1
 $ warning: logi FALSE

Warning: Problem with `mutate()` column `amp44`.
ℹ `amp44 = `%>%`(...)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
Warning: Problem with `mutate()` column `amp44`.
ℹ `amp44 = `%>%`(...)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
Warning: Problem with `mutate()` column `amp44`.
ℹ `amp44 = `%>%`(...)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
Warning: Problem with `mutate()` column `amp44`.
ℹ `amp44 = `%>%`(...)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
Warning: Problem with `mutate()` column `amp44`.
ℹ `amp44 = `%>%`(...)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue

  |                                                                            
  |.............                                                         |  19%
  ordinary text without R code


  |                                                                            
  |..............                                                        |  20%
label: exp-model (with options) 
List of 1
 $ warning: logi FALSE

Warning: don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
Warning: don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
Warning: don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
Warning: don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
Warning: don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue

  ordinary text without R code


  |                                                                            
  |...............                                                       |  21%
label: save-k

  |                                                                            
  |...............                                                       |  22%
  ordinary text without R code


  |                                                                            
  |................                                                      |  23%
label: chrom-model-bad

  |                                                                            
  |.................                                                     |  24%
  ordinary text without R code


  |                                                                            
  |.................                                                     |  25%
label: weak-inject-chrom-ampls

  |                                                                            
  |..................                                                    |  25%
  ordinary text without R code


  |                                                                            
  |..................                                                    |  26%
label: weak-inject-chrom-ampls-fit

  |                                                                            
  |...................                                                   |  27%
  ordinary text without R code


  |                                                                            
  |....................                                                  |  28%
label: estimate_ampl_t0 (with options) 
List of 1
 $ warning: logi FALSE


  |                                                                            
  |....................                                                  |  29%
  ordinary text without R code


  |                                                                            
  |.....................                                                 |  30%
label: amp44-measured-v-expected (with options) 
List of 2
 $ fig.width : num 15
 $ fig.height: num 8


  ordinary text without R code


  |                                                                            
  |......................                                                |  31%
label: filter-out-bad-injects

  |                                                                            
  |......................                                                |  32%
  ordinary text without R code


  |                                                                            
  |.......................                                               |  33%
label: plot-good-peaks (with options) 
List of 2
 $ fig.width : num 15
 $ fig.height: num 8


  |                                                                            
  |........................                                              |  34%
  ordinary text without R code


label: function-ampl-t0

  |                                                                            
  |.........................                                             |  35%
  ordinary text without R code


  |                                                                            
  |.........................                                             |  36%
label: count-peaks

  |                                                                            
  |..........................                                            |  37%
  ordinary text without R code


  |                                                                            
  |..........................                                            |  38%
label: keep-min-4-peaks

  |                                                                            
  |...........................                                           |  39%
  ordinary text without R code


  |                                                                            
  |............................                                          |  39%
label: re-calc-ampl-t0 (with options) 
List of 1
 $ warning: logi FALSE

Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 1: file_id = "16589__CU sequoia flush gas.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 1: file_id = "16589__CU sequoia flush gas.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 1: file_id = "16589__CU sequoia flush gas.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 1: file_id = "16589__CU sequoia flush gas.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 1: file_id = "16589__CU sequoia flush gas.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 2: file_id = "16591__5 min He purge 190104.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 2: file_id = "16591__5 min He purge 190104.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 2: file_id = "16591__5 min He purge 190104.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 2: file_id = "16591__5 min He purge 190104.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 2: file_id = "16591__5 min He purge 190104.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 3: file_id = "16593__5 min He purge 190104 + 100 ul H3PO4 190104 rep1.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 3: file_id = "16593__5 min He purge 190104 + 100 ul H3PO4 190104 rep1.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 3: file_id = "16593__5 min He purge 190104 + 100 ul H3PO4 190104 rep1.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 3: file_id = "16593__5 min He purge 190104 + 100 ul H3PO4 190104 rep1.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 3: file_id = "16593__5 min He purge 190104 + 100 ul H3PO4 190104 rep1.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 4: file_id = "16595__5 min He purge 190104 + 100 ul H3PO4 190104 rep3.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 4: file_id = "16595__5 min He purge 190104 + 100 ul H3PO4 190104 rep3.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 4: file_id = "16595__5 min He purge 190104 + 100 ul H3PO4 190104 rep3.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 4: file_id = "16595__5 min He purge 190104 + 100 ul H3PO4 190104 rep3.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 4: file_id = "16595__5 min He purge 190104 + 100 ul H3PO4 190104 rep3.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 5: file_id = "16597__5 min He purge 190104 + 100 ul H3PO4 190104  + 1 ml boiled MilliQ 190104.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 5: file_id = "16597__5 min He purge 190104 + 100 ul H3PO4 190104  + 1 ml boiled MilliQ 190104.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 5: file_id = "16597__5 min He purge 190104 + 100 ul H3PO4 190104  + 1 ml boiled MilliQ 190104.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 5: file_id = "16597__5 min He purge 190104 + 100 ul H3PO4 190104  + 1 ml boiled MilliQ 190104.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 5: file_id = "16597__5 min He purge 190104 + 100 ul H3PO4 190104  + 1 ml boiled MilliQ 190104.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 6: file_id = "16598__18 ug YULE lin.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 6: file_id = "16598__18 ug YULE lin.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 6: file_id = "16598__18 ug YULE lin.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 6: file_id = "16598__18 ug YULE lin.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 6: file_id = "16598__18 ug YULE lin.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 7: file_id = "16599__46 ug YULE lin.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 7: file_id = "16599__46 ug YULE lin.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 7: file_id = "16599__46 ug YULE lin.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 7: file_id = "16599__46 ug YULE lin.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 8: file_id = "16600__111 ug YULE lin.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 8: file_id = "16600__111 ug YULE lin.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 8: file_id = "16600__111 ug YULE lin.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 8: file_id = "16600__111 ug YULE lin.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 8: file_id = "16600__111 ug YULE lin.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 9: file_id = "16601__149 ug YULE lin.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 9: file_id = "16601__149 ug YULE lin.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 9: file_id = "16601__149 ug YULE lin.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 9: file_id = "16601__149 ug YULE lin.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 9: file_id = "16601__149 ug YULE lin.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 10: file_id = "16602__198 ug YULE lin.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 10: file_id = "16602__198 ug YULE lin.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 10: file_id = "16602__198 ug YULE lin.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 10: file_id = "16602__198 ug YULE lin.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 10: file_id = "16602__198 ug YULE lin.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 11: file_id = "16606__248 ug YULE lin.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 11: file_id = "16606__248 ug YULE lin.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 11: file_id = "16606__248 ug YULE lin.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 11: file_id = "16606__248 ug YULE lin.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 11: file_id = "16606__248 ug YULE lin.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 12: file_id = "16607__304 ug YULE lin.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 12: file_id = "16607__304 ug YULE lin.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 12: file_id = "16607__304 ug YULE lin.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 12: file_id = "16607__304 ug YULE lin.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 12: file_id = "16607__304 ug YULE lin.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 13: file_id = "16608__347 ug YULE lin.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 13: file_id = "16608__347 ug YULE lin.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 13: file_id = "16608__347 ug YULE lin.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 13: file_id = "16608__347 ug YULE lin.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 13: file_id = "16608__347 ug YULE lin.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 14: file_id = "16609__435 ug YULE lin.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 14: file_id = "16609__435 ug YULE lin.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 14: file_id = "16609__435 ug YULE lin.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 14: file_id = "16609__435 ug YULE lin.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 14: file_id = "16609__435 ug YULE lin.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 15: file_id = "16610__194 ug YULE drift1.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 15: file_id = "16610__194 ug YULE drift1.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 15: file_id = "16610__194 ug YULE drift1.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 15: file_id = "16610__194 ug YULE drift1.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 15: file_id = "16610__194 ug YULE drift1.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 16: file_id = "16611__204 ug HIS mon1.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 16: file_id = "16611__204 ug HIS mon1.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 16: file_id = "16611__204 ug HIS mon1.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 16: file_id = "16611__204 ug HIS mon1.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 16: file_id = "16611__204 ug HIS mon1.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 17: file_id = "16612__204 ug YULE dis1.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 17: file_id = "16612__204 ug YULE dis1.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 17: file_id = "16612__204 ug YULE dis1.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 17: file_id = "16612__204 ug YULE dis1.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 17: file_id = "16612__204 ug YULE dis1.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 18: file_id = "16613__209 ug HIS dis2.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 18: file_id = "16613__209 ug HIS dis2.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 18: file_id = "16613__209 ug HIS dis2.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 18: file_id = "16613__209 ug HIS dis2.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 19: file_id = "16614__174 ug LSVEC dis3.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 19: file_id = "16614__174 ug LSVEC dis3.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 19: file_id = "16614__174 ug LSVEC dis3.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 19: file_id = "16614__174 ug LSVEC dis3.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 19: file_id = "16614__174 ug LSVEC dis3.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 20: file_id = "16615__216 ug YULE drift2.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 20: file_id = "16615__216 ug YULE drift2.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 20: file_id = "16615__216 ug YULE drift2.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 20: file_id = "16615__216 ug YULE drift2.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 20: file_id = "16615__216 ug YULE drift2.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 21: file_id = "16616__205 ug HIS mon2.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 21: file_id = "16616__205 ug HIS mon2.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 21: file_id = "16616__205 ug HIS mon2.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 22: file_id = "16617__5 min He purge 190104 + 100 ul H3PO4 190104  + 1 ml boiled MilliQ 190104 + 194ug YULE.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 22: file_id = "16617__5 min He purge 190104 + 100 ul H3PO4 190104  + 1 ml boiled MilliQ 190104 + 194ug YULE.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 22: file_id = "16617__5 min He purge 190104 + 100 ul H3PO4 190104  + 1 ml boiled MilliQ 190104 + 194ug YULE.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 22: file_id = "16617__5 min He purge 190104 + 100 ul H3PO4 190104  + 1 ml boiled MilliQ 190104 + 194ug YULE.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 22: file_id = "16617__5 min He purge 190104 + 100 ul H3PO4 190104  + 1 ml boiled MilliQ 190104 + 194ug YULE.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 23: file_id = "16621__BA1A@30.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 23: file_id = "16621__BA1A@30.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 23: file_id = "16621__BA1A@30.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 23: file_id = "16621__BA1A@30.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 24: file_id = "16622__200 ug YULE drift3.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 24: file_id = "16622__200 ug YULE drift3.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 24: file_id = "16622__200 ug YULE drift3.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 24: file_id = "16622__200 ug YULE drift3.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 24: file_id = "16622__200 ug YULE drift3.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 25: file_id = "16623__198 ug HIS mon3.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 25: file_id = "16623__198 ug HIS mon3.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 25: file_id = "16623__198 ug HIS mon3.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 25: file_id = "16623__198 ug HIS mon3.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 25: file_id = "16623__198 ug HIS mon3.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 26: file_id = "16624__BA1A4165.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 26: file_id = "16624__BA1A4165.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 26: file_id = "16624__BA1A4165.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 26: file_id = "16624__BA1A4165.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 26: file_id = "16624__BA1A4165.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 27: file_id = "16625__BA1A108132.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 27: file_id = "16625__BA1A108132.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 27: file_id = "16625__BA1A108132.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 27: file_id = "16625__BA1A108132.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 28: file_id = "16629__196 ug YULE drift4.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 28: file_id = "16629__196 ug YULE drift4.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 28: file_id = "16629__196 ug YULE drift4.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 28: file_id = "16629__196 ug YULE drift4.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 29: file_id = "16630__210 ug HIS mon4.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 29: file_id = "16630__210 ug HIS mon4.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 29: file_id = "16630__210 ug HIS mon4.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 29: file_id = "16630__210 ug HIS mon4.dxf".
Warning: Problem with `mutate()` column `amp44_t0`.
ℹ `amp44_t0 = exp_decay_t0(time = t_stab_to_inject_s, signal = amp44)`.
ℹ don't know how to calculate <double in 'mV'> - <double>, converting to double without units to continue
ℹ The warning occurred in group 29: file_id = "16630__210 ug HIS mon4.dxf".

  |                                                                            
  |............................                                          |  40%
  ordinary text without R code


  |                                                                            
  |.............................                                         |  41%
label: summ-peaks (with options) 
List of 1
 $ warning: logi FALSE

Warning: don't know how to calculate <double> / <double in 'mV'>, converting to double without units to continue
Warning: don't know how to calculate <double> / <double in 'mV'>, converting to double without units to continue
Warning: don't know how to calculate <double> / <double in 'mV'>, converting to double without units to continue
Warning: don't know how to calculate <double> / <double in 'mV'>, converting to double without units to continue
Warning: don't know how to calculate <double> / <double in 'mV'>, converting to double without units to continue
Warning: don't know how to calculate <double> / <double in 'mV'>, converting to double without units to continue
Warning: don't know how to calculate <double> / <double in 'mV'>, converting to double without units to continue
Warning: don't know how to calculate <double> / <double in 'mV'>, converting to double without units to continue
Warning: don't know how to calculate <double> / <double in 'mV'>, converting to double without units to continue
Warning: don't know how to calculate <double> / <double in 'mV'>, converting to double without units to continue
Warning: don't know how to calculate <double> / <double in 'mV'>, converting to double without units to continue
Warning: don't know how to calculate <double> / <double in 'mV'>, converting to double without units to continue
Warning: don't know how to calculate <double> / <double in 'mV'>, converting to double without units to continue
Warning: don't know how to calculate <double> / <double in 'mV'>, converting to double without units to continue
Warning: don't know how to calculate <double> / <double in 'mV'>, converting to double without units to continue
Warning: don't know how to calculate <double> / <double in 'mV'>, converting to double without units to continue
Warning: don't know how to calculate <double> / <double in 'mV'>, converting to double without units to continue
Warning: don't know how to calculate <double> / <double in 'mV'>, converting to double without units to continue
Warning: don't know how to calculate <double> / <double in 'mV'>, converting to double without units to continue
Warning: don't know how to calculate <double> / <double in 'mV'>, converting to double without units to continue
Warning: don't know how to calculate <double> / <double in 'mV'>, converting to double without units to continue
Warning: don't know how to calculate <double> / <double in 'mV'>, converting to double without units to continue
Warning: don't know how to calculate <double> / <double in 'mV'>, converting to double without units to continue
Warning: don't know how to calculate <double> / <double in 'mV'>, converting to double without units to continue
Warning: don't know how to calculate <double> / <double in 'mV'>, converting to double without units to continue
Warning: don't know how to calculate <double> / <double in 'mV'>, converting to double without units to continue
Warning: don't know how to calculate <double> / <double in 'mV'>, converting to double without units to continue
Warning: don't know how to calculate <double> / <double in 'mV'>, converting to double without units to continue
Warning: don't know how to calculate <double> / <double in 'mV'>, converting to double without units to continue

  |                                                                            
  |.............................                                         |  42%
  ordinary text without R code


  |                                                                            
  |..............................                                        |  43%
label: mutate-data-type

  ordinary text without R code


  |                                                                            
  |...............................                                       |  44%
label: unnamed-chunk-1

  |                                                                            
  |................................                                      |  45%
  ordinary text without R code


  |                                                                            
  |................................                                      |  46%
label: calc-LOQ

  |                                                                            
  |.................................                                     |  47%
  ordinary text without R code


  |                                                                            
  |.................................                                     |  48%
label: make-units-explicit

  |                                                                            
  |..................................                                    |  48%
  ordinary text without R code


  |                                                                            
  |..................................                                    |  49%
label: add-LOQ-as-sample

  |                                                                            
  |...................................                                   |  50%
  ordinary text without R code


  |                                                                            
  |....................................                                  |  51%
label: add-general-names

  |                                                                            
  |....................................                                  |  52%
  ordinary text without R code


  |                                                                            
  |.....................................                                 |  52%
label: check-if-quantitatable

  |                                                                            
  |.....................................                                 |  53%
  ordinary text without R code


  |                                                                            
  |......................................                                |  54%
label: input-sample-params

  |                                                                            
  |......................................                                |  55%
  ordinary text without R code


  |                                                                            
  |.......................................                               |  56%
label: select-stnds

  |                                                                            
  |........................................                              |  57%
  ordinary text without R code


label: plot-calib-mass-loaded

  |                                                                            
  |.........................................                             |  58%
  ordinary text without R code


  |                                                                            
  |.........................................                             |  59%
label: chrom-bad-stnd

  |                                                                            
  |..........................................                            |  60%
  ordinary text without R code


  |                                                                            
  |..........................................                            |  61%
label: cull-bad-stnd

  |                                                                            
  |...........................................                           |  61%
  ordinary text without R code


  |                                                                            
  |............................................                          |  62%
label: plot-calib-mass-loaded-culled

  |                                                                            
  |............................................                          |  63%
  ordinary text without R code


  |                                                                            
  |.............................................                         |  64%
label: constants

  |                                                                            
  |.............................................                         |  65%
  ordinary text without R code


  |                                                                            
  |..............................................                        |  66%
label: calc-pCO2-expected

  ordinary text without R code


  |                                                                            
  |...............................................                       |  67%
label: plot-calib-pCO2

  |                                                                            
  |................................................                      |  68%
  ordinary text without R code


  |                                                                            
  |................................................                      |  69%
label: regress-calib-pCO2

  |                                                                            
  |.................................................                     |  70%
  ordinary text without R code


label: filter-for-samples

  |                                                                            
  |..................................................                    |  71%
  ordinary text without R code


  |                                                                            
  |..................................................                    |  72%
label: apply-conc-calib

  |                                                                            
  |...................................................                   |  73%
  ordinary text without R code


  |                                                                            
  |....................................................                  |  74%
label: plot-calib-CaCO3

  |                                                                            
  |....................................................                  |  75%
  ordinary text without R code


  |                                                                            
  |.....................................................                 |  75%
label: calc-DIC-conc

  |                                                                            
  |.....................................................                 |  76%
  ordinary text without R code


  |                                                                            
  |......................................................                |  77%
label: amp44-DIC-sample-stnd-check

  |                                                                            
  |.......................................................               |  78%
  ordinary text without R code


  |                                                                            
  |.......................................................               |  79%
label: plot-summary-reproducibility-d13C

  |                                                                            
  |........................................................              |  80%
  ordinary text without R code


label: cull-bad-reproducibility-d13C

  |                                                                            
  |.........................................................             |  81%
  ordinary text without R code


  |                                                                            
  |.........................................................             |  82%
label: plot-yields-d13C (with options) 
List of 2
 $ fig.height: num 8
 $ fig.width : num 10


  |                                                                            
  |..........................................................            |  83%
  ordinary text without R code


  |                                                                            
  |...........................................................           |  84%
label: cull-yield-outliers (with options) 
List of 2
 $ fig.height: num 8
 $ fig.width : num 10


  ordinary text without R code


  |                                                                            
  |............................................................          |  85%
label: load-isotope-stnds

  |                                                                            
  |............................................................          |  86%
  ordinary text without R code


  |                                                                            
  |.............................................................         |  87%
label: add-isotope-stnds

  |                                                                            
  |.............................................................         |  88%
  ordinary text without R code


  |                                                                            
  |..............................................................        |  89%
label: generate-calib-d13C

  |                                                                            
  |...............................................................       |  89%
  ordinary text without R code


  |                                                                            
  |...............................................................       |  90%
label: calib-coeffs (with options) 
List of 2
 $ fig.width : num 7
 $ fig.height: num 8


  |                                                                            
  |................................................................      |  91%
  ordinary text without R code


  |                                                                            
  |................................................................      |  92%
label: visualize-calib-params (with options) 
List of 3
 $ fig.width : num 8
 $ fig.height: num 11
 $ message   : logi FALSE


  |                                                                            
  |.................................................................     |  93%
  ordinary text without R code


label: apply-global-calib (with options) 
List of 1
 $ cache: logi TRUE


  |                                                                            
  |..................................................................    |  94%
  ordinary text without R code


  |                                                                            
  |...................................................................   |  95%
label: plot-calib-range (with options) 
List of 2
 $ fig.width : num 7
 $ fig.height: num 9


  |                                                                            
  |...................................................................   |  96%
  ordinary text without R code


  |                                                                            
  |....................................................................  |  97%
label: summary-d13C

  |                                                                            
  |....................................................................  |  98%
  ordinary text without R code


  |                                                                            
  |..................................................................... |  98%
label: summary-d13C-conc

  |                                                                            
  |..................................................................... |  99%
  ordinary text without R code


  |                                                                            
  |......................................................................| 100%
label: export

output file: 190208_OM19_DIC.knit.md

/usr/local/bin/pandoc +RTS -K512m -RTS 190208_OM19_DIC.knit.md --to html4 --from markdown+autolink_bare_uris+tex_math_single_backslash --output docs/rmarkdown/190208_OM19_DIC.html --lua-filter /Library/Frameworks/R.framework/Versions/4.1/Resources/library/rmarkdown/rmarkdown/lua/pagebreak.lua --lua-filter /Library/Frameworks/R.framework/Versions/4.1/Resources/library/rmarkdown/rmarkdown/lua/latex-div.lua --self-contained --variable bs3=TRUE --standalone --section-divs --table-of-contents --toc-depth 3 --variable toc_float=1 --variable toc_selectors=h1,h2,h3 --variable toc_collapsed=1 --variable toc_smooth_scroll=1 --variable toc_print=1 --template /Library/Frameworks/R.framework/Versions/4.1/Resources/library/rmarkdown/rmd/h/default.html --no-highlight --variable highlightjs=1 --number-sections --variable theme=bootstrap --css /Users/melo.d/Desktop/Research/thesis_prep/manuscripts/Oman-packers-2018-2019/Oman-packers-2018-2019/stylesheet.css --include-in-header /var/folders/pw/9fk_chms0jl85nfldy5rgfyc0000gn/T//RtmpH5lfsG/rmarkdown-str16661480365bf.html --mathjax --variable 'mathjax-url:https://mathjax.rstudio.com/latest/MathJax.js?config=TeX-AMS-MML_HTMLorMML' --variable code_folding=show --variable code_menu=1 

Output created: docs/rmarkdown/190208_OM19_DIC.html

191130_OM19_CH4_dD.Rmd (NC)

source file has not changed, docs file will not be re-generated (delete file in docs folder to force re-generation)

191218_OM19_C1-C3-HCs_d13C.Rmd (NC)

source file has not changed, docs file will not be re-generated (delete file in docs folder to force re-generation)

201012_BA1_logs.Rmd (NC)

source file has not changed, docs file will not be re-generated (delete file in docs folder to force re-generation)

201013_packer_paper_figs.Rmd (NC)

source file has not changed, docs file will not be re-generated (delete file in docs folder to force re-generation)

BA1_16S_processing.Rmd (NC)

source file has not changed, docs file will not be re-generated (delete file in docs folder to force re-generation)

summary

summary <- rendered_doc_files %>% 
  mutate(
    last_success = case_when(
      generate & success ~ timestamp, 
      TRUE ~ last_success),
    last_fail = case_when(
      generate & success ~ NA_character_,
      generate & !success ~ timestamp,
      TRUE ~ last_fail)
  ) %>% 
  select(-target_folder)
write_csv(select(summary, -generate, -success), path = hash_file)
Warning: The `path` argument of `write_csv()` is deprecated as of readr 1.4.0.
Please use the `file` argument instead.
summary %>% knitr::kable()
type source_file source_copy source_file_hash doc_file last_success last_fail generate success
RMarkdown 180228_OM18_DIC.Rmd docs/rmarkdown/180228_OM18_DIC.Rmd d6417a376802984b0f2939990a2b9f4e docs/rmarkdown/180228_OM18_DIC.html 2021-07-21 22:31:06 EDT NA TRUE TRUE
RMarkdown 180306_OM18_DIC.Rmd docs/rmarkdown/180306_OM18_DIC.Rmd 2787a7c75e9db83e557ec75b9ffa6da5 docs/rmarkdown/180306_OM18_DIC.html 2021-07-21 22:31:06 EDT NA TRUE TRUE
RMarkdown 190208_OM19_DIC.Rmd docs/rmarkdown/190208_OM19_DIC.Rmd 6df306329ce4868406d23b1bece781c4 docs/rmarkdown/190208_OM19_DIC.html 2021-07-21 22:31:06 EDT NA TRUE TRUE
RMarkdown 191130_OM19_CH4_dD.Rmd docs/rmarkdown/191130_OM19_CH4_dD.Rmd 08b4c7c9bea77f3608c79550c1276054 docs/rmarkdown/191130_OM19_CH4_dD.html 2021-07-21 22:27:05 EDT NA FALSE NA
RMarkdown 191218_OM19_C1-C3-HCs_d13C.Rmd docs/rmarkdown/191218_OM19_C1-C3-HCs_d13C.Rmd b8fc7120b52636acd107185df40bf97e docs/rmarkdown/191218_OM19_C1-C3-HCs_d13C.html 2021-07-21 22:27:05 EDT NA FALSE NA
RMarkdown 201012_BA1_logs.Rmd docs/rmarkdown/201012_BA1_logs.Rmd cc5536618ec2024e728f101fedc8c583 docs/rmarkdown/201012_BA1_logs.html 2021-07-21 22:18:20 EDT NA FALSE NA
RMarkdown 201013_packer_paper_figs.Rmd docs/rmarkdown/201013_packer_paper_figs.Rmd f6e913c44b326626df6ce661334639fa docs/rmarkdown/201013_packer_paper_figs.html 2021-07-21 21:26:15 EDT NA FALSE NA
RMarkdown BA1_16S_processing.Rmd docs/rmarkdown/BA1_16S_processing.Rmd e659829d6edaccba47f66a3366f4f3b4 docs/rmarkdown/BA1_16S_processing.html 2021-07-21 22:18:20 EDT NA FALSE NA

index

if (any(summary$generate) || !file.exists(file.path(docs_folder, "index.html"))) {
  out <- render_rmd(
    source_file = file.path(docs_folder, "index.Rmd"), 
    doc_file = file.path("index.html")
  )
  success <- is.null(attr(out, "status"))
  if (success) 
    message("index updated successfully")
  else
    message("something went wrong updating the index, please render index.Rmd manually")
} else {
  message("No files (re)generated, index stays the same.")
}
index updated successfully