Skip to contents

Intended to be used as the final preprocessing step. This function creates data epochs of either fixed or dynamic durations with respect to provided events and time limits, and also includes an intuitive metadata parsing feature where additional trial data embedded within event messages can easily be identified and joined into the resulting epoched data frames.

Usage

epoch(
  eyeris,
  events,
  limits = NULL,
  label = NULL,
  calc_baseline = FALSE,
  apply_baseline = FALSE,
  baseline_type = c("sub", "div"),
  baseline_events = NULL,
  baseline_period = NULL,
  hz = NULL,
  verbose = TRUE
)

Arguments

eyeris

An object of class eyeris derived from load().

events

Either (1) a single string representing the event message to perform trial extraction around, using specified limits to center the epoch around or no limits (which then just grabs the data epochs between each subsequent event string of the same type); (2) a vector containing both start and end event message strings – here, limits will be ignored and the duration of each trial epoch will be the number of samples between each matched start and end event message pair; or (3) a list of 2 dataframes that manually specify start/end event timestamp-message pairs to pull out of the raw timeseries data – here, it is required that each raw timestamp and event message be provided in the following format:

list( data.frame(time = c(...), msg = c(...)), # start events data.frame(time = c(...), msg = c(...)), # end events 1 # block number )

where the first data.frame indicates the start event timestamp and message string pairs, and the second data.frame indicates the end event timestamp and message string pairs. Additionally, manual epoching only words with 1 block at a time for event-modes 2 and 3; thus, please be sure to explicitly indicate the block number in your input list (for examples, see above as well as example #9 below for more details).

For event-modes 1 and 2, the way in which you pass in the event message string must conform to a standardized protocol so that eyeris knows how to find your events and (optionally) parse any included metadata into the tidy epoch data outputs. You have two primary choices: either (a) specify a string followed by a * wildcard expression (e.g., "PROBE_START*), which will match any messages that have "PROBE_START ..." (... referring to potential metadata, such as trial number, stim file, etc.); or (b) specify a string using the eyeris syntax: (e.g., "PROBE_{type}_{trial}"), which will match the messages that follow a structure like this "PROBE_START_1" and "PROBE_STOP_1", and generate two additional metadata columns: type and trial, which would contain the following values based on these two example strings: type: ('START', 'STOP'), and trial: (1, 1).

limits

A vector of 2 values (start, end) in seconds, indicating where trial extraction should occur centered around any given start message string in the events parameter.

label

An (optional) string you can provide to customize the name of the resulting eyeris class object containing the epoched data frame. If left as NULL (default), then list item will be called epoch_xyz, where xyz will be a sanitized version of the original start event string you provided for matching. If you choose to specify a label here, then the resulting list object name will take the form: epoch_label. Warning: if no label is specified and there are no event message strings to sanitize, then you may obtain a strange-looking epoch list element in your output object (e.g., $epoch_, or $epoch_nana, etc.). The data should still be accessible within this nested lists, however, to avoid ambiguous list objects, we recommend you provide an epoch label here to be safe.

calc_baseline

A flag indicated whether to perform baseline correction. Note, setting calc_baseline to TRUE alone will only compute the baseline period, but will not apply it to the preprocessed timeseries unless apply_baseline is also set to TRUE.

apply_baseline

A flag indicating whether to apply the calculated baseline to the pupil timeseries. The baseline correction will be applied to the pupil from the latest preprocessing step.

baseline_type

Whether to perform subtractive (sub) or divisive (div) baseline correction. Defaults to sub.

baseline_events

Similar to events, baseline_events, you can supply either (1) a single string representing the event message to center the baseline calculation around, as indicated by baseline_period; or (2) a single vector containing both a start and an end event message string – here, baseline_period will be ignored and the duration of each baseline period that the mean will be calculated on will be the number of samples between each matched start and end event message pair, as opposed to a specified fixed duration (as described in 1). Please note, providing a list of trial-level start/end message pairs (like in the events parameter) to manually indicate unique start/end chunks for baselining is currently unsupported. Though, we intend to add this feature in a later version of eyeris, given it likely won't be a heavily utilized / in demand feature.

baseline_period

A vector of 2 values (start, end) in seconds, indicating the window of data that will be used to perform the baseline correction, which will be centered around the single string "start" message string provided in baseline_events. Again, baseline_period will be ignored if both a "start" and "end" message string are provided to the baseline_events argument.

hz

Data sampling rate. If not specified, will use the value contained within the tracker's metadata.

verbose

A flag to indicate whether to print detailed logging messages. Defaults to TRUE. Set to False to suppress messages about the current processing step and run silently.

Value

Updated eyeris object with dataframes containing the epoched data (epoch_).

Examples

eye_preproc <- system.file("extdata", "memory.asc", package = "eyeris") |>
  eyeris::load_asc() |>
  eyeris::deblink(extend = 50) |>
  eyeris::detransient() |>
  eyeris::interpolate() |>
  eyeris::lpfilt(plot_freqz = TRUE) |>
  eyeris::zscore()


# example 1: select 1 second before/after matched event message "PROBE*"
eye_preproc |>
  eyeris::epoch(events = "PROBE*", limits = c(-1, 1))
#>  Epoching pupil data...
#>  Block 1: found 10 matching events for PROBE
#>  Done!
#>  Block 1: pupil data from 10 unique event messages extracted
#>  Pupil epoching completed in 0.09 seconds
#> $file
#> [1] "/home/sts/R/x86_64-pc-linux-gnu-library/4.3/eyeris/extdata/memory.asc"
#> 
#> $timeseries
#> $timeseries$block_1
#> # A tibble: 20,767 × 13
#>    block time_orig eye_x eye_y eye      hz type     pupil_raw pupil_raw_deblink
#>    <dbl>     <int> <dbl> <dbl> <chr> <dbl> <chr>        <dbl>             <dbl>
#>  1     1  11334491  982.  555. R      1000 diameter      6198              6198
#>  2     1  11334492  981.  554. R      1000 diameter      6201              6201
#>  3     1  11334493  981   553. R      1000 diameter      6201              6201
#>  4     1  11334494  981.  554. R      1000 diameter      6202              6202
#>  5     1  11334495  981.  554. R      1000 diameter      6202              6202
#>  6     1  11334496  981.  553  R      1000 diameter      6200              6200
#>  7     1  11334497  982.  551. R      1000 diameter      6198              6198
#>  8     1  11334498  983   550. R      1000 diameter      6196              6196
#>  9     1  11334499  984.  551. R      1000 diameter      6196              6196
#> 10     1  11334500  983.  552. R      1000 diameter      6199              6199
#> # ℹ 20,757 more rows
#> # ℹ 4 more variables: pupil_raw_deblink_detransient <dbl>,
#> #   pupil_raw_deblink_detransient_interpolate <dbl>,
#> #   pupil_raw_deblink_detransient_interpolate_lpfilt <dbl>,
#> #   pupil_raw_deblink_detransient_interpolate_lpfilt_z <dbl>
#> 
#> 
#> $events
#> $events$block_1
#> # A tibble: 67 × 3
#>    block     time text                      
#>    <dbl>    <dbl> <chr>                     
#>  1     1 11242177 !MODE RECORD CR 1000 2 1 R
#>  2     1 11334491 EXP_START                 
#>  3     1 11334491 TRIALID 22                
#>  4     1 11334491 START_TRIAL_22            
#>  5     1 11334491 CUE_START_22              
#>  6     1 11335466 CUE_STOP_22               
#>  7     1 11335467 DELAY_START_22            
#>  8     1 11336473 DELAY_STOP_22             
#>  9     1 11336474 PROBE_START_22            
#> 10     1 11337158 RESPONSE_22               
#> # ℹ 57 more rows
#> 
#> 
#> $blinks
#> $blinks$block_1
#> # A tibble: 1 × 5
#>   block    stime    etime   dur eye  
#>   <dbl>    <dbl>    <dbl> <dbl> <fct>
#> 1     1 11348253 11348308    56 R    
#> 
#> 
#> $info
#>                  date        model version sample.rate   cr  left right mono
#> 1 2009-01-11 02:40:47 EyeLink 1000   4.594        1000 TRUE FALSE  TRUE TRUE
#>   screen.x screen.y                                 mount filter.level
#> 1     1920     1080 Desktop / Monocular / Head Stabilized            2
#>   sample.dtype event.dtype pupil.dtype velocity resolution htarg input buttons
#> 1         GAZE        GAZE    DIAMETER    FALSE      FALSE FALSE  TRUE   FALSE
#> 
#> $latest
#> [1] "pupil_raw_deblink_detransient_interpolate_lpfilt_z_epoch"
#> 
#> $params
#> $params$deblink
#> pkgdown::build_site_github_pages(clean = TRUE, install = FALSE, 
#>     new_process = FALSE)
#> 
#> $params$detransient
#> pkgdown::build_site_github_pages(clean = TRUE, install = FALSE, 
#>     new_process = FALSE)
#> 
#> $params$interpolate
#> pkgdown::build_site_github_pages(clean = TRUE, install = FALSE, 
#>     new_process = FALSE)
#> 
#> $params$lpfilt
#> pkgdown::build_site_github_pages(clean = TRUE, install = FALSE, 
#>     new_process = FALSE)
#> 
#> $params$z
#> pkgdown::build_site_github_pages(clean = TRUE, install = FALSE, 
#>     new_process = FALSE)
#> 
#> $params$epoch
#> pkgdown::build_site_github_pages(clean = TRUE, install = FALSE, 
#>     new_process = FALSE)
#> 
#> 
#> $epoch_probe
#> $epoch_probe$block_1
#> # A tibble: 20,000 × 18
#>    block time_orig timebin eye_x eye_y eye      hz type     pupil_raw
#>    <dbl>     <int>   <dbl> <dbl> <dbl> <chr> <dbl> <chr>        <dbl>
#>  1     1  11335474 0        975.  545. R      1000 diameter      6138
#>  2     1  11335475 0.00100  975.  544. R      1000 diameter      6144
#>  3     1  11335476 0.00200  975.  544  R      1000 diameter      6146
#>  4     1  11335477 0.00300  976.  544. R      1000 diameter      6143
#>  5     1  11335478 0.00400  975.  545  R      1000 diameter      6141
#>  6     1  11335479 0.00500  975.  545. R      1000 diameter      6140
#>  7     1  11335480 0.00600  975.  544. R      1000 diameter      6137
#>  8     1  11335481 0.00700  975.  544. R      1000 diameter      6127
#>  9     1  11335482 0.00800  975   545. R      1000 diameter      6119
#> 10     1  11335483 0.00900  975.  546. R      1000 diameter      6113
#> # ℹ 19,990 more rows
#> # ℹ 9 more variables: pupil_raw_deblink <dbl>,
#> #   pupil_raw_deblink_detransient <dbl>,
#> #   pupil_raw_deblink_detransient_interpolate <dbl>,
#> #   pupil_raw_deblink_detransient_interpolate_lpfilt <dbl>,
#> #   pupil_raw_deblink_detransient_interpolate_lpfilt_z <dbl>, template <chr>,
#> #   matching_pattern <chr>, matched_event <chr>, event_message <chr>
#> 
#> 
#> attr(,"class")
#> [1] "eyeris"

# example 2: select all samples between each trial
eye_preproc |>
  eyeris::epoch(events = "TRIALID {trial}")
#>  Epoching pupil data...
#>  Block 1: found 5 matching events for TRIALIDtrial
#>  Done!
#>  Block 1: pupil data from 5 unique event messages extracted
#>  Pupil epoching completed in 0.04 seconds
#> $file
#> [1] "/home/sts/R/x86_64-pc-linux-gnu-library/4.3/eyeris/extdata/memory.asc"
#> 
#> $timeseries
#> $timeseries$block_1
#> # A tibble: 20,767 × 13
#>    block time_orig eye_x eye_y eye      hz type     pupil_raw pupil_raw_deblink
#>    <dbl>     <int> <dbl> <dbl> <chr> <dbl> <chr>        <dbl>             <dbl>
#>  1     1  11334491  982.  555. R      1000 diameter      6198              6198
#>  2     1  11334492  981.  554. R      1000 diameter      6201              6201
#>  3     1  11334493  981   553. R      1000 diameter      6201              6201
#>  4     1  11334494  981.  554. R      1000 diameter      6202              6202
#>  5     1  11334495  981.  554. R      1000 diameter      6202              6202
#>  6     1  11334496  981.  553  R      1000 diameter      6200              6200
#>  7     1  11334497  982.  551. R      1000 diameter      6198              6198
#>  8     1  11334498  983   550. R      1000 diameter      6196              6196
#>  9     1  11334499  984.  551. R      1000 diameter      6196              6196
#> 10     1  11334500  983.  552. R      1000 diameter      6199              6199
#> # ℹ 20,757 more rows
#> # ℹ 4 more variables: pupil_raw_deblink_detransient <dbl>,
#> #   pupil_raw_deblink_detransient_interpolate <dbl>,
#> #   pupil_raw_deblink_detransient_interpolate_lpfilt <dbl>,
#> #   pupil_raw_deblink_detransient_interpolate_lpfilt_z <dbl>
#> 
#> 
#> $events
#> $events$block_1
#> # A tibble: 67 × 3
#>    block     time text                      
#>    <dbl>    <dbl> <chr>                     
#>  1     1 11242177 !MODE RECORD CR 1000 2 1 R
#>  2     1 11334491 EXP_START                 
#>  3     1 11334491 TRIALID 22                
#>  4     1 11334491 START_TRIAL_22            
#>  5     1 11334491 CUE_START_22              
#>  6     1 11335466 CUE_STOP_22               
#>  7     1 11335467 DELAY_START_22            
#>  8     1 11336473 DELAY_STOP_22             
#>  9     1 11336474 PROBE_START_22            
#> 10     1 11337158 RESPONSE_22               
#> # ℹ 57 more rows
#> 
#> 
#> $blinks
#> $blinks$block_1
#> # A tibble: 1 × 5
#>   block    stime    etime   dur eye  
#>   <dbl>    <dbl>    <dbl> <dbl> <fct>
#> 1     1 11348253 11348308    56 R    
#> 
#> 
#> $info
#>                  date        model version sample.rate   cr  left right mono
#> 1 2009-01-11 02:40:47 EyeLink 1000   4.594        1000 TRUE FALSE  TRUE TRUE
#>   screen.x screen.y                                 mount filter.level
#> 1     1920     1080 Desktop / Monocular / Head Stabilized            2
#>   sample.dtype event.dtype pupil.dtype velocity resolution htarg input buttons
#> 1         GAZE        GAZE    DIAMETER    FALSE      FALSE FALSE  TRUE   FALSE
#> 
#> $latest
#> [1] "pupil_raw_deblink_detransient_interpolate_lpfilt_z_epoch"
#> 
#> $params
#> $params$deblink
#> pkgdown::build_site_github_pages(clean = TRUE, install = FALSE, 
#>     new_process = FALSE)
#> 
#> $params$detransient
#> pkgdown::build_site_github_pages(clean = TRUE, install = FALSE, 
#>     new_process = FALSE)
#> 
#> $params$interpolate
#> pkgdown::build_site_github_pages(clean = TRUE, install = FALSE, 
#>     new_process = FALSE)
#> 
#> $params$lpfilt
#> pkgdown::build_site_github_pages(clean = TRUE, install = FALSE, 
#>     new_process = FALSE)
#> 
#> $params$z
#> pkgdown::build_site_github_pages(clean = TRUE, install = FALSE, 
#>     new_process = FALSE)
#> 
#> $params$epoch
#> pkgdown::build_site_github_pages(clean = TRUE, install = FALSE, 
#>     new_process = FALSE)
#> 
#> 
#> $epoch_trialidTrial
#> $epoch_trialidTrial$block_1
#> # A tibble: 20,650 × 18
#>    block time_orig eye_x eye_y eye      hz type     pupil_raw pupil_raw_deblink
#>    <dbl>     <int> <dbl> <dbl> <chr> <dbl> <chr>        <dbl>             <dbl>
#>  1     1  11334491  982.  555. R      1000 diameter      6198              6198
#>  2     1  11334492  981.  554. R      1000 diameter      6201              6201
#>  3     1  11334493  981   553. R      1000 diameter      6201              6201
#>  4     1  11334494  981.  554. R      1000 diameter      6202              6202
#>  5     1  11334495  981.  554. R      1000 diameter      6202              6202
#>  6     1  11334496  981.  553  R      1000 diameter      6200              6200
#>  7     1  11334497  982.  551. R      1000 diameter      6198              6198
#>  8     1  11334498  983   550. R      1000 diameter      6196              6196
#>  9     1  11334499  984.  551. R      1000 diameter      6196              6196
#> 10     1  11334500  983.  552. R      1000 diameter      6199              6199
#> # ℹ 20,640 more rows
#> # ℹ 9 more variables: pupil_raw_deblink_detransient <dbl>,
#> #   pupil_raw_deblink_detransient_interpolate <dbl>,
#> #   pupil_raw_deblink_detransient_interpolate_lpfilt <dbl>,
#> #   pupil_raw_deblink_detransient_interpolate_lpfilt_z <dbl>, timebin <dbl>,
#> #   template <chr>, matching_pattern <chr>, matched_event <chr>, trial <chr>
#> 
#> 
#> attr(,"class")
#> [1] "eyeris"

# example 3: grab the 1 second following probe onset
eye_preproc |>
  eyeris::epoch(
    events = "PROBE_START_{trial}",
    limits = c(0, 1)
  )
#>  Epoching pupil data...
#>  Block 1: found 5 matching events for PROBESTARTtrial
#>  Done!
#>  Block 1: pupil data from 5 unique event messages extracted
#>  Pupil epoching completed in 0.04 seconds
#> $file
#> [1] "/home/sts/R/x86_64-pc-linux-gnu-library/4.3/eyeris/extdata/memory.asc"
#> 
#> $timeseries
#> $timeseries$block_1
#> # A tibble: 20,767 × 13
#>    block time_orig eye_x eye_y eye      hz type     pupil_raw pupil_raw_deblink
#>    <dbl>     <int> <dbl> <dbl> <chr> <dbl> <chr>        <dbl>             <dbl>
#>  1     1  11334491  982.  555. R      1000 diameter      6198              6198
#>  2     1  11334492  981.  554. R      1000 diameter      6201              6201
#>  3     1  11334493  981   553. R      1000 diameter      6201              6201
#>  4     1  11334494  981.  554. R      1000 diameter      6202              6202
#>  5     1  11334495  981.  554. R      1000 diameter      6202              6202
#>  6     1  11334496  981.  553  R      1000 diameter      6200              6200
#>  7     1  11334497  982.  551. R      1000 diameter      6198              6198
#>  8     1  11334498  983   550. R      1000 diameter      6196              6196
#>  9     1  11334499  984.  551. R      1000 diameter      6196              6196
#> 10     1  11334500  983.  552. R      1000 diameter      6199              6199
#> # ℹ 20,757 more rows
#> # ℹ 4 more variables: pupil_raw_deblink_detransient <dbl>,
#> #   pupil_raw_deblink_detransient_interpolate <dbl>,
#> #   pupil_raw_deblink_detransient_interpolate_lpfilt <dbl>,
#> #   pupil_raw_deblink_detransient_interpolate_lpfilt_z <dbl>
#> 
#> 
#> $events
#> $events$block_1
#> # A tibble: 67 × 3
#>    block     time text                      
#>    <dbl>    <dbl> <chr>                     
#>  1     1 11242177 !MODE RECORD CR 1000 2 1 R
#>  2     1 11334491 EXP_START                 
#>  3     1 11334491 TRIALID 22                
#>  4     1 11334491 START_TRIAL_22            
#>  5     1 11334491 CUE_START_22              
#>  6     1 11335466 CUE_STOP_22               
#>  7     1 11335467 DELAY_START_22            
#>  8     1 11336473 DELAY_STOP_22             
#>  9     1 11336474 PROBE_START_22            
#> 10     1 11337158 RESPONSE_22               
#> # ℹ 57 more rows
#> 
#> 
#> $blinks
#> $blinks$block_1
#> # A tibble: 1 × 5
#>   block    stime    etime   dur eye  
#>   <dbl>    <dbl>    <dbl> <dbl> <fct>
#> 1     1 11348253 11348308    56 R    
#> 
#> 
#> $info
#>                  date        model version sample.rate   cr  left right mono
#> 1 2009-01-11 02:40:47 EyeLink 1000   4.594        1000 TRUE FALSE  TRUE TRUE
#>   screen.x screen.y                                 mount filter.level
#> 1     1920     1080 Desktop / Monocular / Head Stabilized            2
#>   sample.dtype event.dtype pupil.dtype velocity resolution htarg input buttons
#> 1         GAZE        GAZE    DIAMETER    FALSE      FALSE FALSE  TRUE   FALSE
#> 
#> $latest
#> [1] "pupil_raw_deblink_detransient_interpolate_lpfilt_z_epoch"
#> 
#> $params
#> $params$deblink
#> pkgdown::build_site_github_pages(clean = TRUE, install = FALSE, 
#>     new_process = FALSE)
#> 
#> $params$detransient
#> pkgdown::build_site_github_pages(clean = TRUE, install = FALSE, 
#>     new_process = FALSE)
#> 
#> $params$interpolate
#> pkgdown::build_site_github_pages(clean = TRUE, install = FALSE, 
#>     new_process = FALSE)
#> 
#> $params$lpfilt
#> pkgdown::build_site_github_pages(clean = TRUE, install = FALSE, 
#>     new_process = FALSE)
#> 
#> $params$z
#> pkgdown::build_site_github_pages(clean = TRUE, install = FALSE, 
#>     new_process = FALSE)
#> 
#> $params$epoch
#> pkgdown::build_site_github_pages(clean = TRUE, install = FALSE, 
#>     new_process = FALSE)
#> 
#> 
#> $epoch_probeStartTrial
#> $epoch_probeStartTrial$block_1
#> # A tibble: 5,000 × 18
#>    block time_orig timebin eye_x eye_y eye      hz type     pupil_raw
#>    <dbl>     <int>   <dbl> <dbl> <dbl> <chr> <dbl> <chr>        <dbl>
#>  1     1  11336474 0        972.  550. R      1000 diameter      6513
#>  2     1  11336475 0.00100  971.  551. R      1000 diameter      6512
#>  3     1  11336476 0.00200  970.  551. R      1000 diameter      6512
#>  4     1  11336477 0.00300  970.  550. R      1000 diameter      6512
#>  5     1  11336478 0.00400  971.  548. R      1000 diameter      6514
#>  6     1  11336479 0.00501  972.  547. R      1000 diameter      6516
#>  7     1  11336480 0.00601  972.  548. R      1000 diameter      6518
#>  8     1  11336481 0.00701  972.  548. R      1000 diameter      6518
#>  9     1  11336482 0.00801  972.  550. R      1000 diameter      6518
#> 10     1  11336483 0.00901  972.  550. R      1000 diameter      6517
#> # ℹ 4,990 more rows
#> # ℹ 9 more variables: pupil_raw_deblink <dbl>,
#> #   pupil_raw_deblink_detransient <dbl>,
#> #   pupil_raw_deblink_detransient_interpolate <dbl>,
#> #   pupil_raw_deblink_detransient_interpolate_lpfilt <dbl>,
#> #   pupil_raw_deblink_detransient_interpolate_lpfilt_z <dbl>, template <chr>,
#> #   matching_pattern <chr>, matched_event <chr>, trial <chr>
#> 
#> 
#> attr(,"class")
#> [1] "eyeris"

# example 4: 1 second prior to and 1 second after probe onset
eye_preproc |>
  eyeris::epoch(
    events = "PROBE_START_{trial}",
    limits = c(-1, 1),
    label = "prePostProbe" # custom epoch label name
  )
#>  Epoching pupil data...
#>  Block 1: found 5 matching events for PROBESTARTtrial
#>  Done!
#>  Block 1: pupil data from 5 unique event messages extracted
#>  Pupil epoching completed in 0.04 seconds
#> $file
#> [1] "/home/sts/R/x86_64-pc-linux-gnu-library/4.3/eyeris/extdata/memory.asc"
#> 
#> $timeseries
#> $timeseries$block_1
#> # A tibble: 20,767 × 13
#>    block time_orig eye_x eye_y eye      hz type     pupil_raw pupil_raw_deblink
#>    <dbl>     <int> <dbl> <dbl> <chr> <dbl> <chr>        <dbl>             <dbl>
#>  1     1  11334491  982.  555. R      1000 diameter      6198              6198
#>  2     1  11334492  981.  554. R      1000 diameter      6201              6201
#>  3     1  11334493  981   553. R      1000 diameter      6201              6201
#>  4     1  11334494  981.  554. R      1000 diameter      6202              6202
#>  5     1  11334495  981.  554. R      1000 diameter      6202              6202
#>  6     1  11334496  981.  553  R      1000 diameter      6200              6200
#>  7     1  11334497  982.  551. R      1000 diameter      6198              6198
#>  8     1  11334498  983   550. R      1000 diameter      6196              6196
#>  9     1  11334499  984.  551. R      1000 diameter      6196              6196
#> 10     1  11334500  983.  552. R      1000 diameter      6199              6199
#> # ℹ 20,757 more rows
#> # ℹ 4 more variables: pupil_raw_deblink_detransient <dbl>,
#> #   pupil_raw_deblink_detransient_interpolate <dbl>,
#> #   pupil_raw_deblink_detransient_interpolate_lpfilt <dbl>,
#> #   pupil_raw_deblink_detransient_interpolate_lpfilt_z <dbl>
#> 
#> 
#> $events
#> $events$block_1
#> # A tibble: 67 × 3
#>    block     time text                      
#>    <dbl>    <dbl> <chr>                     
#>  1     1 11242177 !MODE RECORD CR 1000 2 1 R
#>  2     1 11334491 EXP_START                 
#>  3     1 11334491 TRIALID 22                
#>  4     1 11334491 START_TRIAL_22            
#>  5     1 11334491 CUE_START_22              
#>  6     1 11335466 CUE_STOP_22               
#>  7     1 11335467 DELAY_START_22            
#>  8     1 11336473 DELAY_STOP_22             
#>  9     1 11336474 PROBE_START_22            
#> 10     1 11337158 RESPONSE_22               
#> # ℹ 57 more rows
#> 
#> 
#> $blinks
#> $blinks$block_1
#> # A tibble: 1 × 5
#>   block    stime    etime   dur eye  
#>   <dbl>    <dbl>    <dbl> <dbl> <fct>
#> 1     1 11348253 11348308    56 R    
#> 
#> 
#> $info
#>                  date        model version sample.rate   cr  left right mono
#> 1 2009-01-11 02:40:47 EyeLink 1000   4.594        1000 TRUE FALSE  TRUE TRUE
#>   screen.x screen.y                                 mount filter.level
#> 1     1920     1080 Desktop / Monocular / Head Stabilized            2
#>   sample.dtype event.dtype pupil.dtype velocity resolution htarg input buttons
#> 1         GAZE        GAZE    DIAMETER    FALSE      FALSE FALSE  TRUE   FALSE
#> 
#> $latest
#> [1] "pupil_raw_deblink_detransient_interpolate_lpfilt_z_epoch"
#> 
#> $params
#> $params$deblink
#> pkgdown::build_site_github_pages(clean = TRUE, install = FALSE, 
#>     new_process = FALSE)
#> 
#> $params$detransient
#> pkgdown::build_site_github_pages(clean = TRUE, install = FALSE, 
#>     new_process = FALSE)
#> 
#> $params$interpolate
#> pkgdown::build_site_github_pages(clean = TRUE, install = FALSE, 
#>     new_process = FALSE)
#> 
#> $params$lpfilt
#> pkgdown::build_site_github_pages(clean = TRUE, install = FALSE, 
#>     new_process = FALSE)
#> 
#> $params$z
#> pkgdown::build_site_github_pages(clean = TRUE, install = FALSE, 
#>     new_process = FALSE)
#> 
#> $params$epoch
#> pkgdown::build_site_github_pages(clean = TRUE, install = FALSE, 
#>     new_process = FALSE)
#> 
#> 
#> $epoch_prePostProbe
#> $epoch_prePostProbe$block_1
#> # A tibble: 10,000 × 18
#>    block time_orig timebin eye_x eye_y eye      hz type     pupil_raw
#>    <dbl>     <int>   <dbl> <dbl> <dbl> <chr> <dbl> <chr>        <dbl>
#>  1     1  11335474 0        975.  545. R      1000 diameter      6138
#>  2     1  11335475 0.00100  975.  544. R      1000 diameter      6144
#>  3     1  11335476 0.00200  975.  544  R      1000 diameter      6146
#>  4     1  11335477 0.00300  976.  544. R      1000 diameter      6143
#>  5     1  11335478 0.00400  975.  545  R      1000 diameter      6141
#>  6     1  11335479 0.00500  975.  545. R      1000 diameter      6140
#>  7     1  11335480 0.00600  975.  544. R      1000 diameter      6137
#>  8     1  11335481 0.00700  975.  544. R      1000 diameter      6127
#>  9     1  11335482 0.00800  975   545. R      1000 diameter      6119
#> 10     1  11335483 0.00900  975.  546. R      1000 diameter      6113
#> # ℹ 9,990 more rows
#> # ℹ 9 more variables: pupil_raw_deblink <dbl>,
#> #   pupil_raw_deblink_detransient <dbl>,
#> #   pupil_raw_deblink_detransient_interpolate <dbl>,
#> #   pupil_raw_deblink_detransient_interpolate_lpfilt <dbl>,
#> #   pupil_raw_deblink_detransient_interpolate_lpfilt_z <dbl>, template <chr>,
#> #   matching_pattern <chr>, matched_event <chr>, trial <chr>
#> 
#> 
#> attr(,"class")
#> [1] "eyeris"

# example 5: manual start/end event pairs
# note: here, the `msg` column of each data frame is optional
eye_preproc |>
  eyeris::epoch(
    events = list(
      data.frame(time = c(11334491), msg = c("TRIALID 22")), # start events
      data.frame(time = c(11337158), msg = c("RESPONSE_22")), # end events
      1 # block number
    ),
    label = "example5"
  )
#>  Epoching pupil data...
#> Warning: NOTE: Manual epoching only works with 1 block at a time.
#> Manual epoch input must be a list of 2 dataframes and 1 numeric:
#>   - `start_events` (df), `end_events` (df), and `block` (numeric)
#> Please be sure to explicitly indicate the block number in yourinput list! (see example #9 in the documentation for more details).
#>  Done!
#>  Block 1: pupil data from 0 unique event messages extracted
#>  Pupil epoching completed in 0.02 seconds
#> $file
#> [1] "/home/sts/R/x86_64-pc-linux-gnu-library/4.3/eyeris/extdata/memory.asc"
#> 
#> $timeseries
#> $timeseries$block_1
#> # A tibble: 20,767 × 13
#>    block time_orig eye_x eye_y eye      hz type     pupil_raw pupil_raw_deblink
#>    <dbl>     <int> <dbl> <dbl> <chr> <dbl> <chr>        <dbl>             <dbl>
#>  1     1  11334491  982.  555. R      1000 diameter      6198              6198
#>  2     1  11334492  981.  554. R      1000 diameter      6201              6201
#>  3     1  11334493  981   553. R      1000 diameter      6201              6201
#>  4     1  11334494  981.  554. R      1000 diameter      6202              6202
#>  5     1  11334495  981.  554. R      1000 diameter      6202              6202
#>  6     1  11334496  981.  553  R      1000 diameter      6200              6200
#>  7     1  11334497  982.  551. R      1000 diameter      6198              6198
#>  8     1  11334498  983   550. R      1000 diameter      6196              6196
#>  9     1  11334499  984.  551. R      1000 diameter      6196              6196
#> 10     1  11334500  983.  552. R      1000 diameter      6199              6199
#> # ℹ 20,757 more rows
#> # ℹ 4 more variables: pupil_raw_deblink_detransient <dbl>,
#> #   pupil_raw_deblink_detransient_interpolate <dbl>,
#> #   pupil_raw_deblink_detransient_interpolate_lpfilt <dbl>,
#> #   pupil_raw_deblink_detransient_interpolate_lpfilt_z <dbl>
#> 
#> 
#> $events
#> $events$block_1
#> # A tibble: 67 × 3
#>    block     time text                      
#>    <dbl>    <dbl> <chr>                     
#>  1     1 11242177 !MODE RECORD CR 1000 2 1 R
#>  2     1 11334491 EXP_START                 
#>  3     1 11334491 TRIALID 22                
#>  4     1 11334491 START_TRIAL_22            
#>  5     1 11334491 CUE_START_22              
#>  6     1 11335466 CUE_STOP_22               
#>  7     1 11335467 DELAY_START_22            
#>  8     1 11336473 DELAY_STOP_22             
#>  9     1 11336474 PROBE_START_22            
#> 10     1 11337158 RESPONSE_22               
#> # ℹ 57 more rows
#> 
#> 
#> $blinks
#> $blinks$block_1
#> # A tibble: 1 × 5
#>   block    stime    etime   dur eye  
#>   <dbl>    <dbl>    <dbl> <dbl> <fct>
#> 1     1 11348253 11348308    56 R    
#> 
#> 
#> $info
#>                  date        model version sample.rate   cr  left right mono
#> 1 2009-01-11 02:40:47 EyeLink 1000   4.594        1000 TRUE FALSE  TRUE TRUE
#>   screen.x screen.y                                 mount filter.level
#> 1     1920     1080 Desktop / Monocular / Head Stabilized            2
#>   sample.dtype event.dtype pupil.dtype velocity resolution htarg input buttons
#> 1         GAZE        GAZE    DIAMETER    FALSE      FALSE FALSE  TRUE   FALSE
#> 
#> $latest
#> [1] "pupil_raw_deblink_detransient_interpolate_lpfilt_z_epoch"
#> 
#> $params
#> $params$deblink
#> pkgdown::build_site_github_pages(clean = TRUE, install = FALSE, 
#>     new_process = FALSE)
#> 
#> $params$detransient
#> pkgdown::build_site_github_pages(clean = TRUE, install = FALSE, 
#>     new_process = FALSE)
#> 
#> $params$interpolate
#> pkgdown::build_site_github_pages(clean = TRUE, install = FALSE, 
#>     new_process = FALSE)
#> 
#> $params$lpfilt
#> pkgdown::build_site_github_pages(clean = TRUE, install = FALSE, 
#>     new_process = FALSE)
#> 
#> $params$z
#> pkgdown::build_site_github_pages(clean = TRUE, install = FALSE, 
#>     new_process = FALSE)
#> 
#> $params$epoch
#> pkgdown::build_site_github_pages(clean = TRUE, install = FALSE, 
#>     new_process = FALSE)
#> 
#> 
#> $epoch_example5
#> $epoch_example5$block_1
#> # A tibble: 2,667 × 18
#>    block time_orig eye_x eye_y eye      hz type     pupil_raw pupil_raw_deblink
#>    <dbl>     <int> <dbl> <dbl> <chr> <dbl> <chr>        <dbl>             <dbl>
#>  1     1  11334491  982.  555. R      1000 diameter      6198              6198
#>  2     1  11334492  981.  554. R      1000 diameter      6201              6201
#>  3     1  11334493  981   553. R      1000 diameter      6201              6201
#>  4     1  11334494  981.  554. R      1000 diameter      6202              6202
#>  5     1  11334495  981.  554. R      1000 diameter      6202              6202
#>  6     1  11334496  981.  553  R      1000 diameter      6200              6200
#>  7     1  11334497  982.  551. R      1000 diameter      6198              6198
#>  8     1  11334498  983   550. R      1000 diameter      6196              6196
#>  9     1  11334499  984.  551. R      1000 diameter      6196              6196
#> 10     1  11334500  983.  552. R      1000 diameter      6199              6199
#> # ℹ 2,657 more rows
#> # ℹ 9 more variables: pupil_raw_deblink_detransient <dbl>,
#> #   pupil_raw_deblink_detransient_interpolate <dbl>,
#> #   pupil_raw_deblink_detransient_interpolate_lpfilt <dbl>,
#> #   pupil_raw_deblink_detransient_interpolate_lpfilt_z <dbl>, timebin <dbl>,
#> #   start_time <dbl>, start_msg <chr>, end_time <dbl>, end_msg <chr>
#> 
#> 
#> attr(,"class")
#> [1] "eyeris"

# example 6: manual start/end event pairs
# note: set `msg` to NA if you only want to pass in start/end timestamps
eye_preproc |>
  eyeris::epoch(
    events = list(
      data.frame(time = c(11334491), msg = NA), # start events
      data.frame(time = c(11337158), msg = NA), # end events
      1 # block number
    ),
    label = "example6"
  )
#>  Epoching pupil data...
#> Warning: NOTE: Manual epoching only works with 1 block at a time.
#> Manual epoch input must be a list of 2 dataframes and 1 numeric:
#>   - `start_events` (df), `end_events` (df), and `block` (numeric)
#> Please be sure to explicitly indicate the block number in yourinput list! (see example #9 in the documentation for more details).
#>  Done!
#>  Block 1: pupil data from 0 unique event messages extracted
#>  Pupil epoching completed in 0.01 seconds
#> $file
#> [1] "/home/sts/R/x86_64-pc-linux-gnu-library/4.3/eyeris/extdata/memory.asc"
#> 
#> $timeseries
#> $timeseries$block_1
#> # A tibble: 20,767 × 13
#>    block time_orig eye_x eye_y eye      hz type     pupil_raw pupil_raw_deblink
#>    <dbl>     <int> <dbl> <dbl> <chr> <dbl> <chr>        <dbl>             <dbl>
#>  1     1  11334491  982.  555. R      1000 diameter      6198              6198
#>  2     1  11334492  981.  554. R      1000 diameter      6201              6201
#>  3     1  11334493  981   553. R      1000 diameter      6201              6201
#>  4     1  11334494  981.  554. R      1000 diameter      6202              6202
#>  5     1  11334495  981.  554. R      1000 diameter      6202              6202
#>  6     1  11334496  981.  553  R      1000 diameter      6200              6200
#>  7     1  11334497  982.  551. R      1000 diameter      6198              6198
#>  8     1  11334498  983   550. R      1000 diameter      6196              6196
#>  9     1  11334499  984.  551. R      1000 diameter      6196              6196
#> 10     1  11334500  983.  552. R      1000 diameter      6199              6199
#> # ℹ 20,757 more rows
#> # ℹ 4 more variables: pupil_raw_deblink_detransient <dbl>,
#> #   pupil_raw_deblink_detransient_interpolate <dbl>,
#> #   pupil_raw_deblink_detransient_interpolate_lpfilt <dbl>,
#> #   pupil_raw_deblink_detransient_interpolate_lpfilt_z <dbl>
#> 
#> 
#> $events
#> $events$block_1
#> # A tibble: 67 × 3
#>    block     time text                      
#>    <dbl>    <dbl> <chr>                     
#>  1     1 11242177 !MODE RECORD CR 1000 2 1 R
#>  2     1 11334491 EXP_START                 
#>  3     1 11334491 TRIALID 22                
#>  4     1 11334491 START_TRIAL_22            
#>  5     1 11334491 CUE_START_22              
#>  6     1 11335466 CUE_STOP_22               
#>  7     1 11335467 DELAY_START_22            
#>  8     1 11336473 DELAY_STOP_22             
#>  9     1 11336474 PROBE_START_22            
#> 10     1 11337158 RESPONSE_22               
#> # ℹ 57 more rows
#> 
#> 
#> $blinks
#> $blinks$block_1
#> # A tibble: 1 × 5
#>   block    stime    etime   dur eye  
#>   <dbl>    <dbl>    <dbl> <dbl> <fct>
#> 1     1 11348253 11348308    56 R    
#> 
#> 
#> $info
#>                  date        model version sample.rate   cr  left right mono
#> 1 2009-01-11 02:40:47 EyeLink 1000   4.594        1000 TRUE FALSE  TRUE TRUE
#>   screen.x screen.y                                 mount filter.level
#> 1     1920     1080 Desktop / Monocular / Head Stabilized            2
#>   sample.dtype event.dtype pupil.dtype velocity resolution htarg input buttons
#> 1         GAZE        GAZE    DIAMETER    FALSE      FALSE FALSE  TRUE   FALSE
#> 
#> $latest
#> [1] "pupil_raw_deblink_detransient_interpolate_lpfilt_z_epoch"
#> 
#> $params
#> $params$deblink
#> pkgdown::build_site_github_pages(clean = TRUE, install = FALSE, 
#>     new_process = FALSE)
#> 
#> $params$detransient
#> pkgdown::build_site_github_pages(clean = TRUE, install = FALSE, 
#>     new_process = FALSE)
#> 
#> $params$interpolate
#> pkgdown::build_site_github_pages(clean = TRUE, install = FALSE, 
#>     new_process = FALSE)
#> 
#> $params$lpfilt
#> pkgdown::build_site_github_pages(clean = TRUE, install = FALSE, 
#>     new_process = FALSE)
#> 
#> $params$z
#> pkgdown::build_site_github_pages(clean = TRUE, install = FALSE, 
#>     new_process = FALSE)
#> 
#> $params$epoch
#> pkgdown::build_site_github_pages(clean = TRUE, install = FALSE, 
#>     new_process = FALSE)
#> 
#> 
#> $epoch_example6
#> $epoch_example6$block_1
#> # A tibble: 2,667 × 18
#>    block time_orig eye_x eye_y eye      hz type     pupil_raw pupil_raw_deblink
#>    <dbl>     <int> <dbl> <dbl> <chr> <dbl> <chr>        <dbl>             <dbl>
#>  1     1  11334491  982.  555. R      1000 diameter      6198              6198
#>  2     1  11334492  981.  554. R      1000 diameter      6201              6201
#>  3     1  11334493  981   553. R      1000 diameter      6201              6201
#>  4     1  11334494  981.  554. R      1000 diameter      6202              6202
#>  5     1  11334495  981.  554. R      1000 diameter      6202              6202
#>  6     1  11334496  981.  553  R      1000 diameter      6200              6200
#>  7     1  11334497  982.  551. R      1000 diameter      6198              6198
#>  8     1  11334498  983   550. R      1000 diameter      6196              6196
#>  9     1  11334499  984.  551. R      1000 diameter      6196              6196
#> 10     1  11334500  983.  552. R      1000 diameter      6199              6199
#> # ℹ 2,657 more rows
#> # ℹ 9 more variables: pupil_raw_deblink_detransient <dbl>,
#> #   pupil_raw_deblink_detransient_interpolate <dbl>,
#> #   pupil_raw_deblink_detransient_interpolate_lpfilt <dbl>,
#> #   pupil_raw_deblink_detransient_interpolate_lpfilt_z <dbl>, timebin <dbl>,
#> #   start_time <dbl>, start_msg <lgl>, end_time <dbl>, end_msg <lgl>
#> 
#> 
#> attr(,"class")
#> [1] "eyeris"

## examples with baseline arguments enabled

# example 7: use mean of 1-s preceding "PROBE_START" (i.e. "DELAY_STOP")
# to perform subtractive baselining of the 1-s PROBE epochs.
eye_preproc |>
  eyeris::epoch(
    events = "PROBE_START_{trial}",
    limits = c(0, 1), # grab 0 seconds prior to and 1 second post PROBE event
    label = "prePostProbe", # custom epoch label name
    calc_baseline = TRUE,
    apply_baseline = TRUE,
    baseline_type = "sub", # "sub"tractive baseline calculation is default
    baseline_events = "DELAY_STOP_*",
    baseline_period = c(-1, 0)
  )
#>  Epoching and baselining pupil data...
#>  Block 1: found 5 matching events for PROBESTARTtrial
#>  Done!
#>  Block 1: pupil data from 5 unique event messages extracted
#>  Block 1: 5 epochs baselined
#>  Pupil epoching and baselining completed in 0.05 secs
#> $file
#> [1] "/home/sts/R/x86_64-pc-linux-gnu-library/4.3/eyeris/extdata/memory.asc"
#> 
#> $timeseries
#> $timeseries$block_1
#> # A tibble: 20,767 × 13
#>    block time_orig eye_x eye_y eye      hz type     pupil_raw pupil_raw_deblink
#>    <dbl>     <int> <dbl> <dbl> <chr> <dbl> <chr>        <dbl>             <dbl>
#>  1     1  11334491  982.  555. R      1000 diameter      6198              6198
#>  2     1  11334492  981.  554. R      1000 diameter      6201              6201
#>  3     1  11334493  981   553. R      1000 diameter      6201              6201
#>  4     1  11334494  981.  554. R      1000 diameter      6202              6202
#>  5     1  11334495  981.  554. R      1000 diameter      6202              6202
#>  6     1  11334496  981.  553  R      1000 diameter      6200              6200
#>  7     1  11334497  982.  551. R      1000 diameter      6198              6198
#>  8     1  11334498  983   550. R      1000 diameter      6196              6196
#>  9     1  11334499  984.  551. R      1000 diameter      6196              6196
#> 10     1  11334500  983.  552. R      1000 diameter      6199              6199
#> # ℹ 20,757 more rows
#> # ℹ 4 more variables: pupil_raw_deblink_detransient <dbl>,
#> #   pupil_raw_deblink_detransient_interpolate <dbl>,
#> #   pupil_raw_deblink_detransient_interpolate_lpfilt <dbl>,
#> #   pupil_raw_deblink_detransient_interpolate_lpfilt_z <dbl>
#> 
#> 
#> $events
#> $events$block_1
#> # A tibble: 67 × 3
#>    block     time text                      
#>    <dbl>    <dbl> <chr>                     
#>  1     1 11242177 !MODE RECORD CR 1000 2 1 R
#>  2     1 11334491 EXP_START                 
#>  3     1 11334491 TRIALID 22                
#>  4     1 11334491 START_TRIAL_22            
#>  5     1 11334491 CUE_START_22              
#>  6     1 11335466 CUE_STOP_22               
#>  7     1 11335467 DELAY_START_22            
#>  8     1 11336473 DELAY_STOP_22             
#>  9     1 11336474 PROBE_START_22            
#> 10     1 11337158 RESPONSE_22               
#> # ℹ 57 more rows
#> 
#> 
#> $blinks
#> $blinks$block_1
#> # A tibble: 1 × 5
#>   block    stime    etime   dur eye  
#>   <dbl>    <dbl>    <dbl> <dbl> <fct>
#> 1     1 11348253 11348308    56 R    
#> 
#> 
#> $info
#>                  date        model version sample.rate   cr  left right mono
#> 1 2009-01-11 02:40:47 EyeLink 1000   4.594        1000 TRUE FALSE  TRUE TRUE
#>   screen.x screen.y                                 mount filter.level
#> 1     1920     1080 Desktop / Monocular / Head Stabilized            2
#>   sample.dtype event.dtype pupil.dtype velocity resolution htarg input buttons
#> 1         GAZE        GAZE    DIAMETER    FALSE      FALSE FALSE  TRUE   FALSE
#> 
#> $latest
#> [1] "pupil_raw_deblink_detransient_interpolate_lpfilt_z_epoch"
#> 
#> $params
#> $params$deblink
#> pkgdown::build_site_github_pages(clean = TRUE, install = FALSE, 
#>     new_process = FALSE)
#> 
#> $params$detransient
#> pkgdown::build_site_github_pages(clean = TRUE, install = FALSE, 
#>     new_process = FALSE)
#> 
#> $params$interpolate
#> pkgdown::build_site_github_pages(clean = TRUE, install = FALSE, 
#>     new_process = FALSE)
#> 
#> $params$lpfilt
#> pkgdown::build_site_github_pages(clean = TRUE, install = FALSE, 
#>     new_process = FALSE)
#> 
#> $params$z
#> pkgdown::build_site_github_pages(clean = TRUE, install = FALSE, 
#>     new_process = FALSE)
#> 
#> $params$epoch
#> pkgdown::build_site_github_pages(clean = TRUE, install = FALSE, 
#>     new_process = FALSE)
#> 
#> 
#> $epoch_prePostProbe
#> $epoch_prePostProbe$block_1
#> # A tibble: 5,000 × 20
#>    block time_orig timebin eye_x eye_y eye      hz type     pupil_raw
#>    <dbl>     <int>   <dbl> <dbl> <dbl> <chr> <dbl> <chr>        <dbl>
#>  1     1  11336474 0        972.  550. R      1000 diameter      6513
#>  2     1  11336475 0.00100  971.  551. R      1000 diameter      6512
#>  3     1  11336476 0.00200  970.  551. R      1000 diameter      6512
#>  4     1  11336477 0.00300  970.  550. R      1000 diameter      6512
#>  5     1  11336478 0.00400  971.  548. R      1000 diameter      6514
#>  6     1  11336479 0.00501  972.  547. R      1000 diameter      6516
#>  7     1  11336480 0.00601  972.  548. R      1000 diameter      6518
#>  8     1  11336481 0.00701  972.  548. R      1000 diameter      6518
#>  9     1  11336482 0.00801  972.  550. R      1000 diameter      6518
#> 10     1  11336483 0.00901  972.  550. R      1000 diameter      6517
#> # ℹ 4,990 more rows
#> # ℹ 11 more variables: pupil_raw_deblink <dbl>,
#> #   pupil_raw_deblink_detransient <dbl>,
#> #   pupil_raw_deblink_detransient_interpolate <dbl>,
#> #   pupil_raw_deblink_detransient_interpolate_lpfilt <dbl>,
#> #   pupil_raw_deblink_detransient_interpolate_lpfilt_z <dbl>, template <chr>,
#> #   matching_pattern <chr>, matched_event <chr>, trial <chr>, …
#> 
#> 
#> $baseline_pupil_raw_deblink_detransient_interpolate_lpfilt_sub_bline_epoch_prePostProbe
#> $baseline_pupil_raw_deblink_detransient_interpolate_lpfilt_sub_bline_epoch_prePostProbe$block_1
#> $baseline_pupil_raw_deblink_detransient_interpolate_lpfilt_sub_bline_epoch_prePostProbe$block_1$baseline_cor_epochs
#> $baseline_pupil_raw_deblink_detransient_interpolate_lpfilt_sub_bline_epoch_prePostProbe$block_1$baseline_cor_epochs[[1]]
#>    [1]  272.2661229  273.4736684  274.6858806  275.9026945  277.1240439
#>    [6]  278.3498616  279.5800795  280.8146288  282.0534397  283.2964414
#>   [11]  284.5435625  285.7947308  287.0498731  288.3089158  289.5717842
#>   [16]  290.8384034  292.1086974  293.3825899  294.6600037  295.9408612
#>   [21]  297.2250843  298.5125943  299.8033120  301.0971578  302.3940516
#>   [26]  303.6939129  304.9966609  306.3022143  307.6104915  308.9214108
#>   [31]  310.2348900  311.5508468  312.8691984  314.1898623  315.5127553
#>   [36]  316.8377944  318.1648964  319.4939780  320.8249558  322.1577463
#>   [41]  323.4922663  324.8284322  326.1661606  327.5053683  328.8459719
#>   [46]  330.1878885  331.5310348  332.8753281  334.2206858  335.5670252
#>   [51]  336.9142643  338.2623208  339.6111132  340.9605598  342.3105797
#>   [56]  343.6610918  345.0120158  346.3632716  347.7147793  349.0664597
#>   [61]  350.4182340  351.7700235  353.1217505  354.4733373  355.8247070
#>   [66]  357.1757831  358.5264896  359.8767512  361.2264929  362.5756407
#>   [71]  363.9241208  365.2718601  366.6187864  367.9648277  369.3099131
#>   [76]  370.6539720  371.9969347  373.3387321  374.6792959  376.0185584
#>   [81]  377.3564528  378.6929128  380.0278730  381.3612689  382.6930364
#>   [86]  384.0231126  385.3514351  386.6779423  388.0025737  389.3252693
#>   [91]  390.6459700  391.9646177  393.2811549  394.5955250  395.9076725
#>   [96]  397.2175424  398.5250808  399.8302345  401.1329513  402.4331798
#>  [101]  403.7308696  405.0259710  406.3184353  407.6082147  408.8952621
#>  [106]  410.1795317  411.4609781  412.7395572  414.0152255  415.2879406
#>  [111]  416.5576609  417.8243458  419.0879554  420.3484509  421.6057942
#>  [116]  422.8599484  424.1108772  425.3585452  426.6029182  427.8439625
#>  [121]  429.0816456  430.3159356  431.5468017  432.7742138  433.9981430
#>  [126]  435.2185608  436.4354400  437.6487539  438.8584769  440.0645842
#>  [131]  441.2670519  442.4658566  443.6609763  444.8523893  446.0400752
#>  [136]  447.2240139  448.4041866  449.5805750  450.7531617  451.9219301
#>  [141]  453.0868644  454.2479495  455.4051711  456.5585158  457.7079708
#>  [146]  458.8535241  459.9951644  461.1328812  462.2666646  463.3965057
#>  [151]  464.5223959  465.6443277  466.7622940  467.8762885  468.9863055
#>  [156]  470.0923402  471.1943881  472.2924456  473.3865096  474.4765778
#>  [161]  475.5626483  476.6447199  477.7227920  478.7968646  479.8669382
#>  [166]  480.9330140  481.9950936  483.0531793  484.1072738  485.1573804
#>  [171]  486.2035028  487.2456453  488.2838127  489.3180103  490.3482437
#>  [176]  491.3745191  492.3968431  493.4152228  494.4296656  495.4401794
#>  [181]  496.4467724  497.4494533  498.4482311  499.4431151  500.4341151
#>  [186]  501.4212412  502.4045036  503.3839130  504.3594805  505.3312172
#>  [191]  506.2991348  507.2632449  508.2235595  509.1800910  510.1328517
#>  [196]  511.0818544  512.0271117  512.9686369  513.9064429  514.8405432
#>  [201]  515.7709512  516.6976804  517.6207444  518.5401570  519.4559320
#>  [206]  520.3680833  521.2766247  522.1815701  523.0829335  523.9807288
#>  [211]  524.8749698  525.7656704  526.6528444  527.5365054  528.4166672
#>  [216]  529.2933432  530.1665468  531.0362913  531.9025897  532.7654549
#>  [221]  533.6248997  534.4809365  535.3335777  536.1828353  537.0287210
#>  [226]  537.8712463  538.7104223  539.5462601  540.3787700  541.2079622
#>  [231]  542.0338466  542.8564324  543.6757288  544.4917441  545.3044866
#>  [236]  546.1139638  546.9201829  547.7231505  548.5228726  549.3193548
#>  [241]  550.1126020  550.9026187  551.6894085  552.4729746  553.2533195
#>  [246]  554.0304449  554.8043520  555.5750412  556.3425120  557.1067635
#>  [251]  557.8677938  558.6256001  559.3801791  560.1315263  560.8796366
#>  [256]  561.6245039  562.3661214  563.1044810  563.8395740  564.5713907
#>  [261]  565.2999202  566.0251508  566.7470698  567.4656633  568.1809163
#>  [266]  568.8928131  569.6013364  570.3064682  571.0081890  571.7064784
#>  [271]  572.4013147  573.0926751  573.7805355  574.4648706  575.1456537
#>  [276]  575.8228570  576.4964515  577.1664066  577.8326906  578.4952704
#>  [281]  579.1541115  579.8091781  580.4604329  581.1078372  581.7513511
#>  [286]  582.3909330  583.0265399  583.6581274  584.2856496  584.9090591
#>  [291]  585.5283070  586.1433429  586.7541147  587.3605691  587.9626508
#>  [296]  588.5603034  589.1534686  589.7420866  590.3260960  590.9054339
#>  [301]  591.4800356  592.0498351  592.6147643  593.1747540  593.7297330
#>  [306]  594.2796285  594.8243662  595.3638701  595.8980626  596.4268643
#>  [311]  596.9501942  597.4679698  597.9801068  598.4865192  598.9871196
#>  [316]  599.4818188  599.9705258  600.4531483  600.9295921  601.3997615
#>  [321]  601.8635592  602.3208862  602.7716420  603.2157244  603.6530298
#>  [326]  604.0834528  604.5068866  604.9232229  605.3323516  605.7341615
#>  [331]  606.1285395  606.5153713  606.8945410  607.2659313  607.6294235
#>  [336]  607.9848975  608.3322317  608.6713032  609.0019879  609.3241603
#>  [341]  609.6376935  609.9424595  610.2383290  610.5251714  610.8028552
#>  [346]  611.0712476  611.3302145  611.5796210  611.8193311  612.0492077
#>  [351]  612.2691127  612.4789071  612.6784512  612.8676040  613.0462241
#>  [356]  613.2141691  613.3712958  613.5174605  613.6525186  613.7763250
#>  [361]  613.8887340  613.9895994  614.0787744  614.1561120  614.2214645
#>  [366]  614.2746841  614.3156226  614.3441314  614.3600620  614.3632656
#>  [371]  614.3535932  614.3308960  614.2950249  614.2458311  614.1831659
#>  [376]  614.1068807  614.0168270  613.9128569  613.7948225  613.6625765
#>  [381]  613.5159721  613.3548627  613.1791026  612.9885466  612.7830501
#>  [386]  612.5624693  612.3266613  612.0754840  611.8087960  611.5264573
#>  [391]  611.2283286  610.9142718  610.5841500  610.2378276  609.8751701
#>  [396]  609.4960444  609.1003189  608.6878633  608.2585491  607.8122491
#>  [401]  607.3488379  606.8681917  606.3701887  605.8547086  605.3216333
#>  [406]  604.7708465  604.2022338  603.6156830  603.0110842  602.3883293
#>  [411]  601.7473128  601.0879311  600.4100835  599.7136711  598.9985980
#>  [416]  598.2647705  597.5120977  596.7404910  595.9498648  595.1401361
#>  [421]  594.3112247  593.4630534  592.5955475  591.7086357  590.8022493
#>  [426]  589.8763229  588.9307941  587.9656035  586.9806951  585.9760159
#>  [431]  584.9515163  583.9071499  582.8428737  581.7586481  580.6544367
#>  [436]  579.5302069  578.3859293  577.2215782  576.0371313  574.8325699
#>  [441]  573.6078791  572.3630475  571.0980673  569.8129345  568.5076488
#>  [446]  567.1822136  565.8366362  564.4709275  563.0851023  561.6791792
#>  [451]  560.2531807  558.8071331  557.3410666  555.8550151  554.3490166
#>  [456]  552.8231129  551.2773497  549.7117767  548.1264473  546.5214190
#>  [461]  544.8967531  543.2525149  541.5887734  539.9056018  538.2030770
#>  [466]  536.4812797  534.7402947  532.9802104  531.2011194  529.4031178
#>  [471]  527.5863056  525.7507866  523.8966686  522.0240627  520.1330843
#>  [476]  518.2238519  516.2964882  514.3511192  512.3878747  510.4068880
#>  [481]  508.4082962  506.3922395  504.3588619  502.3083108  500.2407370
#>  [486]  498.1562946  496.0551411  493.9374373  491.8033472  489.6530380
#>  [491]  487.4866801  485.3044469  483.1065149  480.8930637  478.6642756
#>  [496]  476.4203361  474.1614333  471.8877581  469.5995043  467.2968681
#>  [501]  464.9800485  462.6492470  460.3046676  457.9465166  455.5750027
#>  [506]  453.1903370  450.7927326  448.3824050  445.9595717  443.5244521
#>  [511]  441.0772676  438.6182416  436.1475992  433.6655672  431.1723741
#>  [516]  428.6682501  426.1534266  423.6281369  421.0926153  418.5470976
#>  [521]  415.9918206  413.4270224  410.8529421  408.2698200  405.6778970
#>  [526]  403.0774149  400.4686165  397.8517450  395.2270443  392.5947589
#>  [531]  389.9551336  387.3084137  384.6548448  381.9946726  379.3281430
#>  [536]  376.6555020  373.9769956  371.2928696  368.6033698  365.9087415
#>  [541]  363.2092299  360.5050799  357.7965356  355.0838409  352.3672388
#>  [546]  349.6469718  346.9232816  344.1964091  341.4665942  338.7340759
#>  [551]  335.9990922  333.2618799  330.5226747  327.7817110  325.0392219
#>  [556]  322.2954391  319.5505929  316.8049122  314.0586242  311.3119543
#>  [561]  308.5651267  305.8183634  303.0718848  300.3259094  297.5806537
#>  [566]  294.8363324  292.0931581  289.3513413  286.6110903  283.8726113
#>  [571]  281.1361083  278.4017830  275.6698347  272.9404605  270.2138549
#>  [576]  267.4902101  264.7697157  262.0525589  259.3389242  256.6289934
#>  [581]  253.9229460  251.2209586  248.5232050  245.8298565  243.1410815
#>  [586]  240.4570455  237.7779114  235.1038392  232.4349859  229.7715058
#>  [591]  227.1135500  224.4612671  221.8148023  219.1742982  216.5398941
#>  [596]  213.9117267  211.2899293  208.6746324  206.0659635  203.4640469
#>  [601]  200.8690042  198.2809535  195.7000103  193.1262867  190.5598920
#>  [606]  188.0009324  185.4495111  182.9057280  180.3696803  177.8414621
#>  [611]  175.3211644  172.8088752  170.3046796  167.8086597  165.3208945
#>  [616]  162.8414602  160.3704299  157.9078741  155.4538600  153.0084521
#>  [621]  150.5717121  148.1436988  145.7244682  143.3140733  140.9125648
#>  [626]  138.5199901  136.1363942  133.7618195  131.3963054  129.0398890
#>  [631]  126.6926046  124.3544840  122.0255565  119.7058487  117.3953850
#>  [636]  115.0941872  112.8022748  110.5196647  108.2463718  105.9824085
#>  [641]  103.7277849  101.4825091   99.2465869   97.0200218   94.8028155
#>  [646]   92.5949675   90.3964753   88.2073343   86.0275382   83.8570786
#>  [651]   81.6959453   79.5441265   77.4016083   75.2683753   73.1444103
#>  [656]   71.0296946   68.9242078   66.8279280   64.7408318   62.6628942
#>  [661]   60.5940890   58.5343884   56.4837635   54.4421840   52.4096183
#>  [666]   50.3860337   48.3713962   46.3656708   44.3688215   42.3808111
#>  [671]   40.4016014   38.4311535   36.4694273   34.5163820   32.5719759
#>  [676]   30.6361666   28.7089108   26.7901647   24.8798838   22.9780227
#>  [681]   21.0845358   19.1993767   17.3224985   15.4538539   13.5933952
#>  [686]   11.7410741    9.8968421    8.0606503    6.2324496    4.4121903
#>  [691]    2.5998229    0.7952974   -1.0014364   -2.7904286   -4.5717296
#>  [696]   -6.3453900   -8.1114601   -9.8699907  -11.6210322  -13.3646353
#>  [701]  -15.1008504  -16.8297280  -18.5513186  -20.2656723  -21.9728393
#>  [706]  -23.6728696  -25.3658129  -27.0517190  -28.7306373  -30.4026169
#>  [711]  -32.0677069  -33.7259558  -35.3774122  -37.0221241  -38.6601395
#>  [716]  -40.2915059  -41.9162704  -43.5344800  -45.1461812  -46.7514201
#>  [721]  -48.3502427  -49.9426943  -51.5288201  -53.1086647  -54.6822724
#>  [726]  -56.2496872  -57.8109526  -59.3661118  -60.9152074  -62.4582818
#>  [731]  -63.9953769  -65.5265343  -67.0517950  -68.5711998  -70.0847890
#>  [736]  -71.5926025  -73.0946799  -74.5910603  -76.0817824  -77.5668846
#>  [741]  -79.0464050  -80.5203810  -81.9888501  -83.4518491  -84.9094146
#>  [746]  -86.3615827  -87.8083894  -89.2498701  -90.6860602  -92.1169946
#>  [751]  -93.5427079  -94.9632344  -96.3786083  -97.7888632  -99.1940329
#>  [756] -100.5941505 -101.9892492 -103.3793619 -104.7645210 -106.1447592
#>  [761] -107.5201087 -108.8906016 -110.2562698 -111.6171452 -112.9732593
#>  [766] -114.3246437 -115.6713299 -117.0133492 -118.3507329 -119.6835121
#>  [771] -121.0117180 -122.3353816 -123.6545340 -124.9692063 -126.2794294
#>  [776] -127.5852345 -128.8866525 -130.1837145 -131.4764516 -132.7648951
#>  [781] -134.0490761 -135.3290260 -136.6047760 -137.8763578 -139.1438028
#>  [786] -140.4071428 -141.6664096 -142.9216350 -144.1728513 -145.4200906
#>  [791] -146.6633853 -147.9027679 -149.1382711 -150.3699278 -151.5977710
#>  [796] -152.8218341 -154.0421503 -155.2587534 -156.4716770 -157.6809553
#>  [801] -158.8866224 -160.0887128 -161.2872610 -162.4823018 -163.6738704
#>  [806] -164.8620018 -166.0467316 -167.2280954 -168.4061289 -169.5808683
#>  [811] -170.7523497 -171.9206096 -173.0856845 -174.2476113 -175.4064269
#>  [816] -176.5621683 -177.7148729 -178.8645782 -180.0113217 -181.1551410
#>  [821] -182.2960742 -183.4341591 -184.5694339 -185.7019366 -186.8317056
#>  [826] -187.9587792 -189.0831957 -190.2049937 -191.3242116 -192.4408880
#>  [831] -193.5550612 -194.6667699 -195.7760524 -196.8829472 -197.9874928
#>  [836] -199.0897273 -200.1896890 -201.2874160 -202.3829463 -203.4763176
#>  [841] -204.5675677 -205.6567340 -206.7438537 -207.8289640 -208.9121016
#>  [846] -209.9933030 -211.0726046 -212.1500421 -213.2256513 -214.2994673
#>  [851] -215.3715252 -216.4418593 -217.5105037 -218.5774921 -219.6428576
#>  [856] -220.7066330 -221.7688503 -222.8295414 -223.8887372 -224.9464683
#>  [861] -226.0027646 -227.0576555 -228.1111695 -229.1633349 -230.2141787
#>  [866] -231.2637277 -232.3120078 -233.3590440 -234.4048607 -235.4494816
#>  [871] -236.4929293 -237.5352257 -238.5763920 -239.6164482 -240.6554136
#>  [876] -241.6933067 -242.7301448 -243.7659444 -244.8007209 -245.8344890
#>  [881] -246.8672619 -247.8990523 -248.9298715 -249.9597299 -250.9886367
#>  [886] -252.0166001 -253.0436273 -254.0697240 -255.0948953 -256.1191447
#>  [891] -257.1424748 -258.1648869 -259.1863811 -260.2069565 -261.2266108
#>  [896] -262.2453405 -263.2631411 -264.2800065 -265.2959298 -266.3109024
#>  [901] -267.3249149 -268.3379563 -269.3500146 -270.3610764 -271.3711270
#>  [906] -272.3801507 -273.3881301 -274.3950470 -275.4008816 -276.4056131
#>  [911] -277.4092192 -278.4116766 -279.4129605 -280.4130450 -281.4119030
#>  [916] -282.4095061 -283.4058246 -284.4008278 -285.3944836 -286.3867588
#>  [921] -287.3776189 -288.3670284 -289.3549506 -290.3413474 -291.3261800
#>  [926] -292.3094081 -293.2909905 -294.2708849 -295.2490478 -296.2254347
#>  [931] -297.2000003 -298.1726979 -299.1434800 -300.1122982 -301.0791031
#>  [936] -302.0438442 -303.0064702 -303.9669291 -304.9251677 -305.8811323
#>  [941] -306.8347681 -307.7860197 -308.7348309 -309.6811447 -310.6249035
#>  [946] -311.5660489 -312.5045220 -313.4402631 -314.3732121 -315.3033082
#>  [951] -316.2304902 -317.1546962 -318.0758641 -318.9939312 -319.9088343
#>  [956] -320.8205100 -321.7288946 -322.6339239 -323.5355336 -324.4336590
#>  [961] -325.3282354 -326.2191977 -327.1064808 -327.9900194 -328.8697484
#>  [966] -329.7456022 -330.6175157 -331.4854233 -332.3492600 -333.2089606
#>  [971] -334.0644599 -334.9156933 -335.7625960 -336.6051036 -337.4431520
#>  [976] -338.2766773 -339.1056162 -339.9299053 -340.7494820 -341.5642841
#>  [981] -342.3742496 -343.1793173 -343.9794265 -344.7745168 -345.5645286
#>  [986] -346.3494031 -347.1290818 -347.9035070 -348.6726220 -349.4363705
#>  [991] -350.1946971 -350.9475472 -351.6948670 -352.4366037 -353.1727053
#>  [996] -353.9031206 -354.6277995 -355.3466928 -356.0597524 -356.7669309
#> 
#> $baseline_pupil_raw_deblink_detransient_interpolate_lpfilt_sub_bline_epoch_prePostProbe$block_1$baseline_cor_epochs[[2]]
#>    [1]  248.873286  249.483524  250.097091  250.714059  251.334498  251.958476
#>    [7]  252.586062  253.217323  253.852324  254.491131  255.133807  255.780415
#>   [13]  256.431015  257.085669  257.744435  258.407370  259.074531  259.745973
#>   [19]  260.421749  261.101910  261.786509  262.475592  263.169209  263.867404
#>   [25]  264.570222  265.277706  265.989896  266.706832  267.428552  268.155090
#>   [31]  268.886482  269.622759  270.363952  271.110090  271.861198  272.617302
#>   [37]  273.378425  274.144587  274.915808  275.692104  276.473492  277.259983
#>   [43]  278.051588  278.848318  279.650178  280.457174  281.269308  282.086582
#>   [49]  282.908994  283.736540  284.569215  285.407012  286.249921  287.097930
#>   [55]  287.951025  288.809190  289.672408  290.540658  291.413917  292.292162
#>   [61]  293.175367  294.063501  294.956536  295.854438  296.757173  297.664705
#>   [67]  298.576994  299.493999  300.415679  301.341988  302.272881  303.208308
#>   [73]  304.148219  305.092562  306.041284  306.994327  307.951634  308.913146
#>   [79]  309.878801  310.848537  311.822289  312.799990  313.781573  314.766968
#>   [85]  315.756104  316.748908  317.745307  318.745225  319.748585  320.755309
#>   [91]  321.765317  322.778528  323.794861  324.814232  325.836557  326.861750
#>   [97]  327.889724  328.920393  329.953668  330.989458  332.027675  333.068226
#>  [103]  334.111021  335.155966  336.202968  337.251934  338.302768  339.355377
#>  [109]  340.409665  341.465536  342.522894  343.581643  344.641686  345.702927
#>  [115]  346.765269  347.828614  348.892866  349.957928  351.023703  352.090095
#>  [121]  353.157007  354.224343  355.292007  356.359904  357.427938  358.496016
#>  [127]  359.564043  360.631926  361.699572  362.766889  363.833785  364.900172
#>  [133]  365.965957  367.031054  368.095375  369.158831  370.221339  371.282813
#>  [139]  372.343171  373.402329  374.460207  375.516725  376.571806  377.625372
#>  [145]  378.677348  379.727660  380.776235  381.823003  382.867895  383.910842
#>  [151]  384.951779  385.990641  387.027367  388.061896  389.094167  390.124126
#>  [157]  391.151716  392.176884  393.199579  394.219751  395.237353  396.252341
#>  [163]  397.264669  398.274298  399.281188  400.285301  401.286603  402.285061
#>  [169]  403.280644  404.273324  405.263073  406.249869  407.233687  408.214509
#>  [175]  409.192316  410.167093  411.138827  412.107506  413.073121  414.035664
#>  [181]  414.995132  415.951521  416.904831  417.855063  418.802222  419.746312
#>  [187]  420.687342  421.625321  422.560262  423.492178  424.421086  425.347003
#>  [193]  426.269948  427.189945  428.107015  429.021186  429.932483  430.840937
#>  [199]  431.746577  432.649436  433.549548  434.446949  435.341676  436.233767
#>  [205]  437.123264  438.010207  438.894639  439.776606  440.656152  441.533323
#>  [211]  442.408169  443.280738  444.151080  445.019246  445.885287  446.749258
#>  [217]  447.611210  448.471199  449.329279  450.185506  451.039935  451.892623
#>  [223]  452.743627  453.593004  454.440811  455.287106  456.131946  456.975388
#>  [229]  457.817490  458.658309  459.497902  460.336326  461.173638  462.009892
#>  [235]  462.845144  463.679450  464.512862  465.345433  466.177217  467.008265
#>  [241]  467.838626  468.668349  469.497483  470.326075  471.154168  471.981808
#>  [247]  472.809036  473.635893  474.462417  475.288647  476.114616  476.940359
#>  [253]  477.765907  478.591288  479.416530  480.241657  481.066692  481.891655
#>  [259]  482.716563  483.541430  484.366270  485.191091  486.015900  486.840702
#>  [265]  487.665496  488.490281  489.315052  490.139799  490.964512  491.789176
#>  [271]  492.613773  493.438281  494.262674  495.086925  495.911002  496.734868
#>  [277]  497.558485  498.381808  499.204792  500.027385  500.849534  501.671179
#>  [283]  502.492258  503.312704  504.132448  504.951414  505.769525  506.586697
#>  [289]  507.402843  508.217873  509.031691  509.844197  510.655289  511.464857
#>  [295]  512.272791  513.078973  513.883282  514.685594  515.485779  516.283703
#>  [301]  517.079229  517.872214  518.662511  519.449971  520.234437  521.015751
#>  [307]  521.793749  522.568263  523.339122  524.106149  524.869164  525.627983
#>  [313]  526.382417  527.132275  527.877360  528.617471  529.352405  530.081953
#>  [319]  530.805905  531.524043  532.236150  532.942002  533.641373  534.334033
#>  [325]  535.019748  535.698283  536.369398  537.032848  537.688388  538.335769
#>  [331]  538.974739  539.605041  540.226419  540.838612  541.441356  542.034385
#>  [337]  542.617432  543.190226  543.752494  544.303962  544.844352  545.373385
#>  [343]  545.890782  546.396260  546.889534  547.370321  547.838333  548.293282
#>  [349]  548.734879  549.162834  549.576858  549.976657  550.361940  550.732415
#>  [355]  551.087787  551.427765  551.752055  552.060362  552.352396  552.627861
#>  [361]  552.886467  553.127921  553.351933  553.558211  553.746466  553.916411
#>  [367]  554.067758  554.200222  554.313519  554.407366  554.481482  554.535590
#>  [373]  554.569412  554.582673  554.575103  554.546431  554.496390  554.424715
#>  [379]  554.331147  554.215426  554.077296  553.916507  553.732809  553.525958
#>  [385]  553.295712  553.041833  552.764088  552.462248  552.136087  551.785384
#>  [391]  551.409922  551.009489  550.583877  550.132883  549.656311  549.153966
#>  [397]  548.625661  548.071213  547.490444  546.883184  546.249265  545.588526
#>  [403]  544.900813  544.185975  543.443870  542.674359  541.877312  541.052602
#>  [409]  540.200111  539.319726  538.411340  537.474853  536.510172  535.517209
#>  [415]  534.495884  533.446124  532.367860  531.261034  530.125591  528.961485
#>  [421]  527.768677  526.547134  525.296829  524.017745  522.709871  521.373200
#>  [427]  520.007737  518.613491  517.190478  515.738723  514.258258  512.749119
#>  [433]  511.211354  509.645014  508.050159  506.426857  504.775181  503.095213
#>  [439]  501.387041  499.650761  497.886474  496.094291  494.274327  492.426707
#>  [445]  490.551561  488.649025  486.719243  484.762368  482.778555  480.767969
#>  [451]  478.730781  476.667168  474.577314  472.461408  470.319648  468.152236
#>  [457]  465.959381  463.741298  461.498207  459.230336  456.937918  454.621191
#>  [463]  452.280398  449.915790  447.527622  445.116155  442.681653  440.224387
#>  [469]  437.744635  435.242675  432.718795  430.173283  427.606435  425.018551
#>  [475]  422.409933  419.780889  417.131731  414.462776  411.774341  409.066752
#>  [481]  406.340334  403.595417  400.832336  398.051427  395.253029  392.437486
#>  [487]  389.605142  386.756345  383.891445  381.010796  378.114752  375.203669
#>  [493]  372.277907  369.337826  366.383788  363.416156  360.435296  357.441573
#>  [499]  354.435354  351.417007  348.386900  345.345404  342.292887  339.229720
#>  [505]  336.156271  333.072913  329.980013  326.877943  323.767071  320.647766
#>  [511]  317.520396  314.385328  311.242929  308.093563  304.937594  301.775386
#>  [517]  298.607298  295.433690  292.254920  289.071344  285.883314  282.691184
#>  [523]  279.495301  276.296013  273.093664  269.888597  266.681149  263.471658
#>  [529]  260.260455  257.047873  253.834237  250.619870  247.405094  244.190226
#>  [535]  240.975577  237.761459  234.548176  231.336030  228.125320  224.916339
#>  [541]  221.709376  218.504718  215.302646  212.103437  208.907362  205.714691
#>  [547]  202.525685  199.340605  196.159704  192.983231  189.811431  186.644543
#>  [553]  183.482803  180.326439  177.175676  174.030735  170.891829  167.759169
#>  [559]  164.632957  161.513394  158.400673  155.294983  152.196507  149.105423
#>  [565]  146.021903  142.946115  139.878222  136.818380  133.766739  130.723447
#>  [571]  127.688644  124.662465  121.645040  118.636493  115.636945  112.646509
#>  [577]  109.665294  106.693403  103.730934  100.777981   97.834631   94.900967
#>  [583]   91.977066   89.063001   86.158838   83.264641   80.380466   77.506365
#>  [589]   74.642387   71.788573   68.944961   66.111585   63.288472   60.475647
#>  [595]   57.673128   54.880929   52.099061   49.327529   46.566335   43.815476
#>  [601]   41.074944   38.344728   35.624812   32.915178   30.215802   27.526656
#>  [607]   24.847710   22.178929   19.520274   16.871705   14.233175   11.604636
#>  [613]    8.986036    6.377319    3.778428    1.189302   -1.390125   -3.959919
#>  [619]   -6.520151   -9.070892  -11.612218  -14.144207  -16.666940  -19.180497
#>  [625]  -21.684965  -24.180431  -26.666983  -29.144711  -31.613711  -34.074074
#>  [631]  -36.525900  -38.969284  -41.404327  -43.831130  -46.249796  -48.660427
#>  [637]  -51.063128  -53.458006  -55.845168  -58.224720  -60.596773  -62.961435
#>  [643]  -65.318816  -67.669027  -70.012179  -72.348384  -74.677753  -77.000400
#>  [649]  -79.316435  -81.625971  -83.929122  -86.225998  -88.516713  -90.801379
#>  [655]  -93.080106  -95.353008  -97.620194  -99.881775 -102.137861 -104.388561
#>  [661] -106.633984 -108.874238 -111.109429 -113.339665 -115.565050 -117.785688
#>  [667] -120.001682 -122.213135 -124.420148 -126.622819 -128.821249 -131.015533
#>  [673] -133.205767 -135.392046 -137.574463 -139.753109 -141.928074 -144.099446
#>  [679] -146.267312 -148.431757 -150.592865 -152.750717 -154.905393 -157.056971
#>  [685] -159.205527 -161.351137 -163.493873 -165.633805 -167.771003 -169.905534
#>  [691] -172.037462 -174.166852 -176.293764 -178.418257 -180.540389 -182.660215
#>  [697] -184.777788 -186.893160 -189.006380 -191.117495 -193.226550 -195.333589
#>  [703] -197.438654 -199.541782 -201.643012 -203.742378 -205.839914 -207.935652
#>  [709] -210.029620 -212.121845 -214.212354 -216.301169 -218.388313 -220.473804
#>  [715] -222.557660 -224.639898 -226.720531 -228.799571 -230.877029 -232.952912
#>  [721] -235.027229 -237.099984 -239.171180 -241.240820 -243.308902 -245.375425
#>  [727] -247.440386 -249.503780 -251.565601 -253.625840 -255.684489 -257.741536
#>  [733] -259.796969 -261.850774 -263.902937 -265.953440 -268.002267 -270.049397
#>  [739] -272.094812 -274.138490 -276.180408 -278.220543 -280.258870 -282.295363
#>  [745] -284.329996 -286.362740 -288.393568 -290.422450 -292.449356 -294.474253
#>  [751] -296.497111 -298.517897 -300.536577 -302.553118 -304.567484 -306.579640
#>  [757] -308.589551 -310.597180 -312.602491 -314.605445 -316.606006 -318.604135
#>  [763] -320.599794 -322.592944 -324.583547 -326.571562 -328.556951 -330.539674
#>  [769] -332.519691 -334.496962 -336.471447 -338.443107 -340.411902 -342.377791
#>  [775] -344.340734 -346.300693 -348.257626 -350.211494 -352.162259 -354.109879
#>  [781] -356.054318 -357.995535 -359.933492 -361.868151 -363.799473 -365.727422
#>  [787] -367.651959 -369.573048 -371.490652 -373.404735 -375.315262 -377.222196
#>  [793] -379.125504 -381.025150 -382.921100 -384.813323 -386.701783 -388.586450
#>  [799] -390.467292 -392.344276 -394.217373 -396.086552 -397.951784 -399.813040
#>  [805] -401.670292 -403.523511 -405.372671 -407.217746 -409.058708 -410.895534
#>  [811] -412.728199 -414.556677 -416.380948 -418.200986 -420.016771 -421.828281
#>  [817] -423.635496 -425.438394 -427.236957 -429.031165 -430.821001 -432.606447
#>  [823] -434.387486 -436.164101 -437.936276 -439.703997 -441.467248 -443.226017
#>  [829] -444.980289 -446.730051 -448.475292 -450.216000 -451.952163 -453.683771
#>  [835] -455.410813 -457.133282 -458.851166 -460.564458 -462.273150 -463.977234
#>  [841] -465.676704 -467.371551 -469.061772 -470.747358 -472.428307 -474.104611
#>  [847] -475.776267 -477.443272 -479.105620 -480.763309 -482.416335 -484.064697
#>  [853] -485.708391 -487.347415 -488.981769 -490.611449 -492.236456 -493.856787
#>  [859] -495.472443 -497.083423 -498.689726 -500.291353 -501.888304 -503.480578
#>  [865] -505.068177 -506.651102 -508.229352 -509.802929 -511.371834 -512.936068
#>  [871] -514.495633 -516.050530 -517.600759 -519.146324 -520.687225 -522.223464
#>  [877] -523.755042 -525.281963 -526.804226 -528.321835 -529.834790 -531.343093
#>  [883] -532.846748 -534.345754 -535.840114 -537.329830 -538.814903 -540.295336
#>  [889] -541.771129 -543.242284 -544.708803 -546.170688 -547.627939 -549.080558
#>  [895] -550.528548 -551.971907 -553.410639 -554.844744 -556.274224 -557.699078
#>  [901] -559.119309 -560.534917 -561.945903 -563.352267 -564.754011 -566.151134
#>  [907] -567.543638 -568.931523 -570.314790 -571.693438 -573.067469 -574.436882
#>  [913] -575.801677 -577.161856 -578.517418 -579.868363 -581.214691 -582.556403
#>  [919] -583.893499 -585.225978 -586.553841 -587.877088 -589.195720 -590.509735
#>  [925] -591.819135 -593.123919 -594.424088 -595.719643 -597.010582 -598.296908
#>  [931] -599.578621 -600.855720 -602.128207 -603.396083 -604.659348 -605.918003
#>  [937] -607.172051 -608.421491 -609.666326 -610.906556 -612.142185 -613.373213
#>  [943] -614.599644 -615.821478 -617.038719 -618.251370 -619.459434 -620.662913
#>  [949] -621.861812 -623.056134 -624.245882 -625.431062 -626.611678 -627.787735
#>  [955] -628.959238 -630.126191 -631.288602 -632.446477 -633.599820 -634.748641
#>  [961] -635.892945 -637.032740 -638.168034 -639.298835 -640.425152 -641.546995
#>  [967] -642.664371 -643.777292 -644.885767 -645.989808 -647.089424 -648.184629
#>  [973] -649.275433 -650.361849 -651.443890 -652.521570 -653.594901 -654.663899
#>  [979] -655.728578 -656.788953 -657.845039 -658.896854 -659.944413 -660.987733
#>  [985] -662.026832 -663.061729 -664.092441 -665.118987 -666.141387 -667.159661
#>  [991] -668.173829 -669.183913 -670.189932 -671.191911 -672.189870 -673.183832
#>  [997] -674.173821 -675.159861 -676.141975 -677.120189
#> 
#> $baseline_pupil_raw_deblink_detransient_interpolate_lpfilt_sub_bline_epoch_prePostProbe$block_1$baseline_cor_epochs[[3]]
#>    [1] 453.78440259 454.54466863 455.30788769 456.07412807 456.84345559
#>    [6] 457.61593357 458.39162279 459.17058149 459.95286534 460.73852740
#>   [11] 461.52761816 462.32018547 463.11627456 463.91592802 464.71918578
#>   [16] 465.52608514 466.33666070 467.15094443 467.96896563 468.79075093
#>   [21] 469.61632427 470.44570698 471.27891770 472.11597243 472.95688453
#>   [26] 473.80166475 474.65032120 475.50285939 476.35928227 477.21959020
#>   [31] 478.08378098 478.95184991 479.82378976 480.69959082 481.57924095
#>   [36] 482.46272554 483.35002760 484.24112776 485.13600432 486.03463327
#>   [41] 486.93698832 487.84304095 488.75276044 489.66611391 490.58306634
#>   [46] 491.50358067 492.42761777 493.35513654 494.28609390 495.22044491
#>   [51] 496.15814274 497.09913878 498.04338264 498.99082224 499.94140386
#>   [56] 500.89507214 501.85177020 502.81143966 503.77402071 504.73945214
#>   [61] 505.70767142 506.67861477 507.65221717 508.62841247 509.60713343
#>   [66] 510.58831177 511.57187824 512.55776269 513.54589411 514.53620071
#>   [71] 515.52860998 516.52304874 517.51944322 518.51771911 519.51780163
#>   [76] 520.51961561 521.52308550 522.52813550 523.53468957 524.54267154
#>   [81] 525.55200514 526.56261405 527.57442204 528.58735292 529.60133071
#>   [86] 530.61627964 531.63212420 532.64878928 533.66620014 534.68428253
#>   [91] 535.70296272 536.72216760 537.74182467 538.76186216 539.78220909
#>   [96] 540.80279526 541.82355140 542.84440913 543.86530109 544.88616097
#>  [101] 545.90692355 546.92752476 547.94790173 548.96799286 549.98773783
#>  [106] 551.00707768 552.02595486 553.04431324 554.06209820 555.07925663
#>  [111] 556.09573701 557.11148941 558.12646559 559.14061896 560.15390469
#>  [116] 561.16627971 562.17770272 563.18813427 564.19753678 565.20587455
#>  [121] 566.21311378 567.21922265 568.22417128 569.22793178 570.23047831
#>  [126] 571.23178701 572.23183612 573.23060593 574.22807879 575.22423917
#>  [131] 576.21907366 577.21257094 578.20472181 579.19551923 580.18495828
#>  [136] 581.17303616 582.15975224 583.14510800 584.12910706 585.11175519
#>  [141] 586.09306025 587.07303223 588.05168323 589.02902742 590.00508107
#>  [146] 590.97986249 591.95339206 592.92569216 593.89678719 594.86670352
#>  [151] 595.83546948 596.80311531 597.76967319 598.73517713 599.69966300
#>  [156] 600.66316845 601.62573294 602.58739762 603.54820535 604.50820064
#>  [161] 605.46742960 606.42593991 607.38378078 608.34100288 609.29765829
#>  [166] 610.25380050 611.20948427 612.16476567 613.11970197 614.07435157
#>  [171] 615.02877401 615.98302982 616.93718056 617.89128866 618.84541742
#>  [176] 619.79963094 620.75399402 621.70857213 622.66343131 623.61863814
#>  [181] 624.57425962 625.53036315 626.48701642 627.44428736 628.40224403
#>  [186] 629.36095460 630.32048723 631.28091002 632.24229089 633.20469757
#>  [191] 634.16819745 635.13285756 636.09874445 637.06592413 638.03446197
#>  [196] 639.00442264 639.97587002 640.94886713 641.92347600 642.89975767
#>  [201] 643.87777202 644.85757776 645.83923229 646.82279165 647.80831045
#>  [206] 648.79584174 649.78543698 650.77714592 651.77101654 652.76709495
#>  [211] 653.76542535 654.76604989 655.76900862 656.77433944 657.78207798
#>  [216] 658.79225751 659.80490893 660.82006062 661.83773840 662.85796547
#>  [221] 663.88076231 664.90614659 665.93413316 666.96473393 667.99795779
#>  [226] 669.03381060 670.07229507 671.11341072 672.15715380 673.20351725
#>  [231] 674.25249061 675.30405998 676.35820797 677.41491361 678.47415234
#>  [236] 679.53589590 680.60011234 681.66676592 682.73581711 683.80722249
#>  [241] 684.88093476 685.95690264 687.03507089 688.11538022 689.19776731
#>  [246] 690.28216470 691.36850085 692.45670002 693.54668231 694.63836361
#>  [251] 695.73165555 696.82646555 697.92269672 699.02024791 700.11901364
#>  [256] 701.21888414 702.31974532 703.42147875 704.52396167 705.62706699
#>  [261] 706.73066329 707.83461483 708.93878153 710.04301901 711.14717858
#>  [266] 712.25110726 713.35464780 714.45763870 715.55991422 716.66130441
#>  [271] 717.76163515 718.86072816 719.95840102 721.05446725 722.14873629
#>  [276] 723.24101359 724.33110062 725.41879491 726.50389013 727.58617610
#>  [281] 728.66543887 729.74146076 730.81402041 731.88289287 732.94784963
#>  [286] 734.00865867 735.06508457 736.11688856 737.16382858 738.20565936
#>  [291] 739.24213249 740.27299650 741.29799695 742.31687649 743.32937498
#>  [296] 744.33522951 745.33417456 746.32594204 747.31026141 748.28685976
#>  [301] 749.25546189 750.21579046 751.16756600 752.11050712 753.04433051
#>  [306] 753.96875110 754.88348217 755.78823542 756.68272109 757.56664811
#>  [311] 758.43972414 759.30165575 760.15214849 760.99090700 761.81763518
#>  [316] 762.63203624 763.43381285 764.22266726 764.99830143 765.76041711
#>  [321] 766.50871599 767.24289984 767.96267057 768.66773044 769.35778209
#>  [326] 770.03252874 770.69167427 771.33492336 771.96198161 772.57255568
#>  [331] 773.16635338 773.74308384 774.30245759 774.84418671 775.36798498
#>  [336] 775.87356794 776.36065305 776.82895985 777.27821001 777.70812750
#>  [341] 778.11843870 778.50887254 778.87916058 779.22903717 779.55823955
#>  [346] 779.86650798 780.15358583 780.41921973 780.66315968 780.88515915
#>  [351] 781.08497520 781.26236858 781.41710386 781.54894956 781.65767819
#>  [356] 781.74306641 781.80489513 781.84294959 781.85701950 781.84689909
#>  [361] 781.81238725 781.75328761 781.66940863 781.56056369 781.42657121
#>  [366] 781.26725471 781.08244289 780.87196975 780.63567464 780.37340235
#>  [371] 780.08500319 779.77033307 779.42925357 779.06163199 778.66734148
#>  [376] 778.24626101 777.79827553 777.32327598 776.82115935 776.29182875
#>  [381] 775.73519345 775.15116897 774.53967705 773.90064579 773.23400962
#>  [386] 772.53970937 771.81769231 771.06791218 770.29032923 769.48491022
#>  [391] 768.65162849 767.79046394 766.90140310 765.98443910 765.03957172
#>  [396] 764.06680737 763.06615914 762.03764677 760.98129667 759.89714194
#>  [401] 758.78522233 757.64558425 756.47828078 755.28337163 754.06092317
#>  [406] 752.81100836 751.53370677 750.22910454 748.89729438 747.53837550
#>  [411] 746.15245362 744.73964093 743.30005602 741.83382389 740.34107590
#>  [416] 738.82194968 737.27658915 735.70514442 734.10777177 732.48463358
#>  [421] 730.83589829 729.16174030 727.46233997 725.73788352 723.98856296
#>  [426] 722.21457602 720.41612612 718.59342224 716.74667889 714.87611600
#>  [431] 712.98195885 711.06443802 709.12378925 707.16025339 705.17407633
#>  [436] 703.16550886 701.13480661 699.08222995 697.00804390 694.91251803
#>  [441] 692.79592636 690.65854726 688.50066336 686.32256140 684.12453222
#>  [446] 681.90687054 679.66987493 677.41384770 675.13909474 672.84592544
#>  [451] 670.53465260 668.20559228 665.85906369 663.49538909 661.11489370
#>  [456] 658.71790549 656.30475518 653.87577604 651.43130380 648.97167654
#>  [461] 646.49723454 644.00832018 641.50527784 638.98845374 636.45819582
#>  [466] 633.91485366 631.35877833 628.79032225 626.20983911 623.61768372
#>  [471] 621.01421188 618.39978030 615.77474645 613.13946842 610.49430485
#>  [476] 607.83961476 605.17575747 602.50309245 599.82197923 597.13277724
#>  [481] 594.43584574 591.73154370 589.02022963 586.30226152 583.57799671
#>  [486] 580.84779178 578.11200243 575.37098337 572.62508821 569.87466936
#>  [491] 567.12007792 564.36166356 561.59977444 558.83475708 556.06695627
#>  [496] 553.29671497 550.52437422 547.75027302 544.97474825 542.19813457
#>  [501] 539.42076431 536.64296743 533.86507136 531.08740097 528.31027846
#>  [506] 525.53402327 522.75895200 519.98537833 517.21361297 514.44396352
#>  [511] 511.67673445 508.91222702 506.15073916 503.39256546 500.63799708
#>  [516] 497.88732169 495.14082337 492.39878261 489.66147620 486.92917720
#>  [521] 484.20215487 481.48067464 478.76499802 476.05538260 473.35208194
#>  [526] 470.65534560 467.96541903 465.28254359 462.60695645 459.93889060
#>  [531] 457.27857480 454.62623355 451.98208705 449.34635120 446.71923754
#>  [536] 444.10095324 441.49170110 438.89167948 436.30108235 433.72009922
#>  [541] 431.14891515 428.58771073 426.03666209 423.49594086 420.96571420
#>  [546] 418.44614478 415.93739076 413.43960584 410.95293921 408.47753560
#>  [551] 406.01353523 403.56107389 401.12028289 398.69128911 396.27421497
#>  [556] 393.86917850 391.47629332 389.09566868 386.72740945 384.37161617
#>  [561] 382.02838508 379.69780810 377.37997291 375.07496294 372.78285743
#>  [566] 370.50373142 368.23765584 365.98469749 363.74491909 361.51837934
#>  [571] 359.30513292 357.10523057 354.91871910 352.74564142 350.58603662
#>  [576] 348.43994000 346.30738309 344.18839373 342.08299608 339.99121070
#>  [581] 337.91305459 335.84854122 333.79768059 331.76047928 329.73694053
#>  [586] 327.72706423 325.73084702 323.74828233 321.77936044 319.82406850
#>  [591] 317.88239064 315.95430799 314.03979871 312.13883811 310.25139866
#>  [596] 308.37745005 306.51695927 304.66989062 302.83620582 301.01586405
#>  [601] 299.20882197 297.41503384 295.63445152 293.86702457 292.11270027
#>  [606] 290.37142370 288.64313781 286.92778344 285.22529939 283.53562251
#>  [611] 281.85868769 280.19442799 278.54277463 276.90365710 275.27700317
#>  [616] 273.66273898 272.06078907 270.47107644 268.89352262 267.32804770
#>  [621] 265.77457039 264.23300808 262.70327689 261.18529171 259.67896625
#>  [626] 258.18421311 256.70094382 255.22906887 253.76849779 252.31913917
#>  [631] 250.88090072 249.45368932 248.03741106 246.63197127 245.23727459
#>  [636] 243.85322500 242.47972587 241.11667999 239.76398961 238.42155651
#>  [641] 237.08928199 235.76706695 234.45481192 233.15241708 231.85978232
#>  [646] 230.57680725 229.30339126 228.03943353 226.78483310 225.53948885
#>  [651] 224.30329957 223.07616399 221.85798080 220.64864866 219.44806628
#>  [656] 218.25613240 217.07274583 215.89780549 214.73121041 213.57285979
#>  [661] 212.42265298 211.28048956 210.14626930 209.01989222 207.90125861
#>  [666] 206.79026901 205.68682430 204.59082566 203.50217462 202.42077303
#>  [671] 201.34652316 200.27932763 199.21908947 198.16571214 197.11909952
#>  [676] 196.07915594 195.04578616 194.01889545 192.99838954 191.98417463
#>  [681] 190.97615746 189.97424525 188.97834575 187.98836725 187.00421854
#>  [686] 186.02580900 185.05304853 184.08584759 183.12411722 182.16776902
#>  [691] 181.21671515 180.27086838 179.33014203 178.39445003 177.46370689
#>  [696] 176.53782774 175.61672826 174.70032477 173.78853419 172.88127401
#>  [701] 171.97846237 171.08001799 170.18586021 169.29590897 168.41008483
#>  [706] 167.52830895 166.65050310 165.77658969 164.90649169 164.04013272
#>  [711] 163.17743699 162.31832933 161.46273516 160.61058054 159.76179209
#>  [716] 158.91629707 158.07402333 157.23489933 156.39885411 155.56581733
#>  [721] 154.73571924 153.90849068 153.08406310 152.26236853 151.44333958
#>  [726] 150.62690948 149.81301201 149.00158157 148.19255312 147.38586222
#>  [731] 146.58144500 145.77923817 144.97917903 144.18120544 143.38525584
#>  [736] 142.59126925 141.79918526 141.00894404 140.22048631 139.43375338
#>  [741] 138.64868712 137.86522996 137.08332492 136.30291557 135.52394604
#>  [746] 134.74636105 133.97010586 133.19512631 132.42136881 131.64878031
#>  [751] 130.87730836 130.10690105 129.33750705 128.56907558 127.80155645
#>  [756] 127.03490001 126.26905722 125.50397956 124.73961912 123.97592854
#>  [761] 123.21286103 122.45037039 121.68841099 120.92693776 120.16590624
#>  [766] 119.40527251 118.64499326 117.88502576 117.12532786 116.36585798
#>  [771] 115.60657515 114.84743899 114.08840970 113.32944808 112.57051551
#>  [776] 111.81157401 111.05258615 110.29351513 109.53432476 108.77497943
#>  [781] 108.01544416 107.25568456 106.49566688 105.73535797 104.97472527
#>  [786] 104.21373689 103.45236151 102.69056846 101.92832769 101.16560976
#>  [791] 100.40238587  99.63862785  98.87430813  98.10939981  97.34387659
#>  [796]  96.57771281  95.81088346  95.04336415  94.27513110  93.50616121
#>  [801]  92.73643199  91.96592157  91.19460874  90.42247292  89.64949416
#>  [806]  88.87565313  88.10093115  87.32531017  86.54877276  85.77130212
#>  [811]  84.99288209  84.21349712  83.43313230  82.65177331  81.86940647
#>  [816]  81.08601873  80.30159762  79.51613129  78.72960851  77.94201862
#>  [821]  77.15335159  76.36359797  75.57274888  74.78079605  73.98773179
#>  [826]  73.19354894  72.39824096  71.60180184  70.80422613  70.00550894
#>  [831]  69.20564589  68.40463317  67.60246748  66.79914604  65.99466657
#>  [836]  65.18902732  64.38222701  63.57426486  62.76514056  61.95485426
#>  [841]  61.14340659  60.33079860  59.51703180  58.70210813  57.88602992
#>  [846]  57.06879994  56.25042133  55.43089764  54.61023276  53.78843097
#>  [851]  52.96549689  52.14143547  51.31625199  50.48995205  49.66254155
#>  [856]  48.83402666  48.00441384  47.17370982  46.34192154  45.50905622
#>  [861]  44.67512127  43.84012433  43.00407320  42.16697590  41.32884060
#>  [866]  40.48967559  39.64948935  38.80829045  37.96608758  37.12288951
#>  [871]  36.27870511  35.43354331  34.58741308  33.74032343  32.89228341
#>  [876]  32.04330206  31.19338841  30.34255149  29.49080029  28.63814372
#>  [881]  27.78459067  26.93014994  26.07483022  25.21864011  24.36158810
#>  [886]  23.50368253  22.64493161  21.78534339  20.92492573  20.06368634
#>  [891]  19.20163270  18.33877211  17.47511161  16.61065805  15.74541801
#>  [896]  14.87939782  14.01260354  13.14504095  12.27671555  11.40763254
#>  [901]  10.53779679   9.66721287   8.79588503   7.92381715   7.05101280
#>  [906]   6.17747517   5.30320710   4.42821105   3.55248911   2.67604299
#>  [911]   1.79887400   0.92098305   0.04237066  -0.83696307  -1.71701845
#>  [916]  -2.59779619  -3.47929745  -4.36152379  -5.24447721  -6.12816014
#>  [921]  -7.01257544  -7.89772641  -8.78361677  -9.67025068 -10.55763276
#>  [926] -11.44576804 -12.33466200 -13.22432054 -14.11475001 -15.00595719
#>  [931] -15.89794927 -16.79073388 -17.68431909 -18.57871335 -19.47392555
#>  [936] -20.36996499 -21.26684136 -22.16456477 -23.06314569 -23.96259501
#>  [941] -24.86292397 -25.76414420 -26.66626769 -27.56930678 -28.47327415
#>  [946] -29.37818282 -30.28404616 -31.19087781 -32.09869176 -33.00750226
#>  [951] -33.91732387 -34.82817141 -35.74005996 -36.65300485 -37.56702164
#>  [956] -38.48212611 -39.39833425 -40.31566225 -41.23412647 -42.15374344
#>  [961] -43.07452982 -43.99650245 -44.91967824 -45.84407422 -46.76970753
#>  [966] -47.69659536 -48.62475494 -49.55420357 -50.48495854 -51.41703718
#>  [971] -52.35045677 -53.28523458 -54.22138782 -55.15893364 -56.09788911
#>  [976] -57.03827117 -57.98009668 -58.92338232 -59.86814464 -60.81439999
#>  [981] -61.76216455 -62.71145426 -63.66228484 -64.61467176 -65.56863020
#>  [986] -66.52417508 -67.48132098 -68.44008217 -69.40047258 -70.36250575
#>  [991] -71.32619485 -72.29155265 -73.25859149 -74.22732328 -75.19775946
#>  [996] -76.16991099 -77.14378836 -78.11940151 -79.09675988 -80.07587235
#> 
#> $baseline_pupil_raw_deblink_detransient_interpolate_lpfilt_sub_bline_epoch_prePostProbe$block_1$baseline_cor_epochs[[4]]
#>    [1] -348.6058 -348.9136 -349.2175 -349.5177 -349.8140 -350.1064 -350.3949
#>    [8] -350.6795 -350.9602 -351.2370 -351.5099 -351.7788 -352.0437 -352.3046
#>   [15] -352.5616 -352.8146 -353.0635 -353.3085 -353.5495 -353.7864 -354.0193
#>   [22] -354.2482 -354.4730 -354.6938 -354.9106 -355.1233 -355.3320 -355.5367
#>   [29] -355.7373 -355.9340 -356.1265 -356.3151 -356.4997 -356.6803 -356.8568
#>   [36] -357.0294 -357.1981 -357.3627 -357.5234 -357.6802 -357.8331 -357.9821
#>   [43] -358.1271 -358.2683 -358.4057 -358.5392 -358.6689 -358.7949 -358.9170
#>   [50] -359.0355 -359.1502 -359.2612 -359.3686 -359.4723 -359.5724 -359.6690
#>   [57] -359.7620 -359.8515 -359.9375 -360.0200 -360.0992 -360.1749 -360.2474
#>   [64] -360.3165 -360.3823 -360.4449 -360.5044 -360.5606 -360.6138 -360.6639
#>   [71] -360.7110 -360.7551 -360.7962 -360.8345 -360.8699 -360.9025 -360.9323
#>   [78] -360.9595 -360.9839 -361.0058 -361.0251 -361.0419 -361.0562 -361.0681
#>   [85] -361.0776 -361.0849 -361.0898 -361.0926 -361.0932 -361.0917 -361.0882
#>   [92] -361.0826 -361.0751 -361.0658 -361.0546 -361.0416 -361.0269 -361.0105
#>   [99] -360.9925 -360.9729 -360.9519 -360.9294 -360.9055 -360.8803 -360.8538
#>  [106] -360.8261 -360.7972 -360.7672 -360.7361 -360.7040 -360.6710 -360.6371
#>  [113] -360.6023 -360.5668 -360.5306 -360.4936 -360.4561 -360.4179 -360.3793
#>  [120] -360.3402 -360.3007 -360.2608 -360.2206 -360.1802 -360.1395 -360.0987
#>  [127] -360.0578 -360.0169 -359.9759 -359.9350 -359.8941 -359.8534 -359.8129
#>  [134] -359.7726 -359.7325 -359.6928 -359.6534 -359.6144 -359.5758 -359.5377
#>  [141] -359.5002 -359.4632 -359.4267 -359.3909 -359.3558 -359.3214 -359.2877
#>  [148] -359.2547 -359.2226 -359.1913 -359.1608 -359.1312 -359.1026 -359.0748
#>  [155] -359.0481 -359.0223 -358.9976 -358.9739 -358.9512 -358.9296 -358.9092
#>  [162] -358.8898 -358.8715 -358.8544 -358.8385 -358.8237 -358.8101 -358.7977
#>  [169] -358.7865 -358.7765 -358.7678 -358.7602 -358.7539 -358.7488 -358.7449
#>  [176] -358.7422 -358.7408 -358.7406 -358.7416 -358.7439 -358.7473 -358.7519
#>  [183] -358.7578 -358.7648 -358.7729 -358.7823 -358.7927 -358.8043 -358.8170
#>  [190] -358.8308 -358.8457 -358.8616 -358.8786 -358.8965 -358.9155 -358.9354
#>  [197] -358.9562 -358.9779 -359.0005 -359.0240 -359.0482 -359.0733 -359.0990
#>  [204] -359.1255 -359.1527 -359.1805 -359.2090 -359.2379 -359.2674 -359.2974
#>  [211] -359.3279 -359.3587 -359.3899 -359.4214 -359.4532 -359.4851 -359.5173
#>  [218] -359.5496 -359.5820 -359.6144 -359.6468 -359.6791 -359.7112 -359.7433
#>  [225] -359.7751 -359.8066 -359.8377 -359.8685 -359.8989 -359.9288 -359.9581
#>  [232] -359.9868 -360.0148 -360.0422 -360.0688 -360.0945 -360.1193 -360.1433
#>  [239] -360.1662 -360.1881 -360.2088 -360.2284 -360.2468 -360.2638 -360.2796
#>  [246] -360.2940 -360.3069 -360.3183 -360.3281 -360.3363 -360.3429 -360.3477
#>  [253] -360.3508 -360.3520 -360.3514 -360.3488 -360.3442 -360.3376 -360.3289
#>  [260] -360.3181 -360.3051 -360.2898 -360.2723 -360.2524 -360.2302 -360.2056
#>  [267] -360.1785 -360.1489 -360.1167 -360.0820 -360.0447 -360.0047 -359.9620
#>  [274] -359.9166 -359.8684 -359.8175 -359.7637 -359.7070 -359.6475 -359.5851
#>  [281] -359.5197 -359.4514 -359.3802 -359.3059 -359.2286 -359.1483 -359.0650
#>  [288] -358.9786 -358.8891 -358.7965 -358.7009 -358.6022 -358.5003 -358.3954
#>  [295] -358.2874 -358.1763 -358.0621 -357.9448 -357.8245 -357.7011 -357.5746
#>  [302] -357.4451 -357.3125 -357.1770 -357.0385 -356.8970 -356.7526 -356.6052
#>  [309] -356.4550 -356.3019 -356.1461 -355.9874 -355.8260 -355.6618 -355.4951
#>  [316] -355.3256 -355.1537 -354.9792 -354.8022 -354.6228 -354.4410 -354.2569
#>  [323] -354.0706 -353.8820 -353.6914 -353.4986 -353.3039 -353.1073 -352.9088
#>  [330] -352.7085 -352.5065 -352.3029 -352.0977 -351.8911 -351.6831 -351.4738
#>  [337] -351.2632 -351.0516 -350.8389 -350.6253 -350.4108 -350.1956 -349.9798
#>  [344] -349.7634 -349.5465 -349.3293 -349.1118 -348.8943 -348.6766 -348.4591
#>  [351] -348.2418 -348.0248 -347.8081 -347.5921 -347.3766 -347.1620 -346.9482
#>  [358] -346.7354 -346.5237 -346.3133 -346.1043 -345.8967 -345.6908 -345.4866
#>  [365] -345.2843 -345.0840 -344.8858 -344.6898 -344.4962 -344.3052 -344.1168
#>  [372] -343.9311 -343.7484 -343.5687 -343.3921 -343.2189 -343.0491 -342.8828
#>  [379] -342.7203 -342.5615 -342.4068 -342.2561 -342.1097 -341.9676 -341.8300
#>  [386] -341.6971 -341.5689 -341.4455 -341.3272 -341.2141 -341.1062 -341.0037
#>  [393] -340.9068 -340.8155 -340.7301 -340.6505 -340.5770 -340.5097 -340.4486
#>  [400] -340.3940 -340.3459 -340.3044 -340.2698 -340.2420 -340.2213 -340.2076
#>  [407] -340.2013 -340.2022 -340.2107 -340.2267 -340.2505 -340.2820 -340.3214
#>  [414] -340.3688 -340.4244 -340.4882 -340.5602 -340.6407 -340.7297 -340.8273
#>  [421] -340.9335 -341.0486 -341.1725 -341.3054 -341.4473 -341.5984 -341.7586
#>  [428] -341.9281 -342.1070 -342.2953 -342.4931 -342.7005 -342.9175 -343.1443
#>  [435] -343.3808 -343.6271 -343.8833 -344.1494 -344.4256 -344.7117 -345.0080
#>  [442] -345.3144 -345.6310 -345.9578 -346.2949 -346.6423 -347.0000 -347.3681
#>  [449] -347.7466 -348.1355 -348.5348 -348.9446 -349.3649 -349.7957 -350.2370
#>  [456] -350.6888 -351.1512 -351.6241 -352.1076 -352.6016 -353.1061 -353.6212
#>  [463] -354.1468 -354.6830 -355.2297 -355.7868 -356.3545 -356.9326 -357.5212
#>  [470] -358.1202 -358.7296 -359.3493 -359.9794 -360.6198 -361.2705 -361.9314
#>  [477] -362.6025 -363.2837 -363.9751 -364.6765 -365.3879 -366.1092 -366.8405
#>  [484] -367.5815 -368.3324 -369.0930 -369.8633 -370.6431 -371.4325 -372.2313
#>  [491] -373.0395 -373.8570 -374.6838 -375.5197 -376.3646 -377.2186 -378.0815
#>  [498] -378.9532 -379.8337 -380.7228 -381.6205 -382.5266 -383.4411 -384.3639
#>  [505] -385.2948 -386.2339 -387.1809 -388.1358 -389.0984 -390.0687 -391.0466
#>  [512] -392.0319 -393.0246 -394.0244 -395.0314 -396.0454 -397.0663 -398.0939
#>  [519] -399.1281 -400.1689 -401.2161 -402.2696 -403.3292 -404.3949 -405.4665
#>  [526] -406.5438 -407.6269 -408.7154 -409.8094 -410.9086 -412.0129 -413.1223
#>  [533] -414.2365 -415.3555 -416.4791 -417.6072 -418.7396 -419.8762 -421.0169
#>  [540] -422.1615 -423.3099 -424.4619 -425.6175 -426.7765 -427.9387 -429.1040
#>  [547] -430.2723 -431.4434 -432.6172 -433.7936 -434.9723 -436.1533 -437.3365
#>  [554] -438.5216 -439.7086 -440.8973 -442.0876 -443.2793 -444.4723 -445.6664
#>  [561] -446.8616 -448.0576 -449.2544 -450.4518 -451.6496 -452.8478 -454.0461
#>  [568] -455.2445 -456.4428 -457.6409 -458.8387 -460.0359 -461.2326 -462.4284
#>  [575] -463.6234 -464.8174 -466.0102 -467.2017 -468.3919 -469.5805 -470.7674
#>  [582] -471.9525 -473.1358 -474.3169 -475.4959 -476.6727 -477.8470 -479.0188
#>  [589] -480.1879 -481.3543 -482.5178 -483.6783 -484.8356 -485.9898 -487.1406
#>  [596] -488.2879 -489.4317 -490.5718 -491.7081 -492.8406 -493.9690 -495.0934
#>  [603] -496.2135 -497.3294 -498.4408 -499.5478 -500.6502 -501.7479 -502.8408
#>  [610] -503.9289 -505.0119 -506.0900 -507.1629 -508.2306 -509.2930 -510.3500
#>  [617] -511.4015 -512.4475 -513.4879 -514.5226 -515.5515 -516.5746 -517.5917
#>  [624] -518.6029 -519.6080 -520.6070 -521.5998 -522.5864 -523.5667 -524.5407
#>  [631] -525.5082 -526.4692 -527.4238 -528.3717 -529.3131 -530.2478 -531.1757
#>  [638] -532.0969 -533.0113 -533.9189 -534.8195 -535.7133 -536.6001 -537.4799
#>  [645] -538.3527 -539.2184 -540.0771 -540.9287 -541.7731 -542.6104 -543.4405
#>  [652] -544.2634 -545.0791 -545.8876 -546.6888 -547.4828 -548.2695 -549.0489
#>  [659] -549.8211 -550.5859 -551.3435 -552.0937 -552.8367 -553.5724 -554.3007
#>  [666] -555.0218 -555.7355 -556.4420 -557.1412 -557.8331 -558.5177 -559.1951
#>  [673] -559.8653 -560.5282 -561.1840 -561.8325 -562.4739 -563.1081 -563.7351
#>  [680] -564.3551 -564.9679 -565.5737 -566.1725 -566.7642 -567.3490 -567.9267
#>  [687] -568.4976 -569.0616 -569.6186 -570.1689 -570.7123 -571.2490 -571.7790
#>  [694] -572.3022 -572.8188 -573.3287 -573.8321 -574.3289 -574.8193 -575.3031
#>  [701] -575.7805 -576.2516 -576.7162 -577.1746 -577.6268 -578.0727 -578.5124
#>  [708] -578.9460 -579.3736 -579.7951 -580.2106 -580.6202 -581.0238 -581.4216
#>  [715] -581.8136 -582.1999 -582.5804 -582.9553 -583.3245 -583.6882 -584.0463
#>  [722] -584.3990 -584.7462 -585.0881 -585.4246 -585.7558 -586.0818 -586.4026
#>  [729] -586.7182 -587.0287 -587.3342 -587.6347 -587.9302 -588.2207 -588.5064
#>  [736] -588.7873 -589.0634 -589.3347 -589.6013 -589.8633 -590.1206 -590.3734
#>  [743] -590.6217 -590.8655 -591.1048 -591.3397 -591.5702 -591.7964 -592.0183
#>  [750] -592.2360 -592.4494 -592.6587 -592.8638 -593.0649 -593.2618 -593.4547
#>  [757] -593.6436 -593.8285 -594.0095 -594.1866 -594.3598 -594.5291 -594.6946
#>  [764] -594.8564 -595.0143 -595.1686 -595.3191 -595.4659 -595.6091 -595.7487
#>  [771] -595.8846 -596.0170 -596.1458 -596.2710 -596.3927 -596.5109 -596.6257
#>  [778] -596.7369 -596.8447 -596.9491 -597.0501 -597.1477 -597.2419 -597.3327
#>  [785] -597.4201 -597.5043 -597.5851 -597.6625 -597.7367 -597.8076 -597.8752
#>  [792] -597.9395 -598.0005 -598.0583 -598.1128 -598.1641 -598.2122 -598.2570
#>  [799] -598.2986 -598.3370 -598.3722 -598.4041 -598.4329 -598.4584 -598.4808
#>  [806] -598.4999 -598.5159 -598.5287 -598.5383 -598.5447 -598.5479 -598.5479
#>  [813] -598.5447 -598.5384 -598.5289 -598.5162 -598.5003 -598.4812 -598.4590
#>  [820] -598.4336 -598.4050 -598.3732 -598.3382 -598.3001 -598.2587 -598.2142
#>  [827] -598.1665 -598.1156 -598.0615 -598.0043 -597.9439 -597.8802 -597.8134
#>  [834] -597.7434 -597.6703 -597.5939 -597.5144 -597.4316 -597.3457 -597.2567
#>  [841] -597.1644 -597.0690 -596.9704 -596.8686 -596.7637 -596.6556 -596.5443
#>  [848] -596.4299 -596.3123 -596.1916 -596.0678 -595.9408 -595.8107 -595.6775
#>  [855] -595.5411 -595.4016 -595.2591 -595.1134 -594.9647 -594.8128 -594.6579
#>  [862] -594.5000 -594.3390 -594.1749 -594.0079 -593.8378 -593.6647 -593.4886
#>  [869] -593.3096 -593.1276 -592.9426 -592.7547 -592.5639 -592.3701 -592.1735
#>  [876] -591.9740 -591.7717 -591.5665 -591.3585 -591.1476 -590.9340 -590.7176
#>  [883] -590.4985 -590.2767 -590.0521 -589.8248 -589.5949 -589.3623 -589.1271
#>  [890] -588.8893 -588.6490 -588.4060 -588.1605 -587.9125 -587.6621 -587.4091
#>  [897] -587.1537 -586.8959 -586.6357 -586.3732 -586.1083 -585.8410 -585.5715
#>  [904] -585.2997 -585.0257 -584.7495 -584.4711 -584.1905 -583.9078 -583.6230
#>  [911] -583.3361 -583.0471 -582.7561 -582.4631 -582.1682 -581.8713 -581.5724
#>  [918] -581.2717 -580.9691 -580.6647 -580.3585 -580.0504 -579.7406 -579.4291
#>  [925] -579.1159 -578.8010 -578.4844 -578.1662 -577.8464 -577.5251 -577.2022
#>  [932] -576.8777 -576.5517 -576.2243 -575.8954 -575.5651 -575.2334 -574.9003
#>  [939] -574.5658 -574.2300 -573.8928 -573.5544 -573.2147 -572.8738 -572.5316
#>  [946] -572.1882 -571.8436 -571.4978 -571.1509 -570.8029 -570.4537 -570.1034
#>  [953] -569.7521 -569.3996 -569.0461 -568.6916 -568.3361 -567.9795 -567.6220
#>  [960] -567.2634 -566.9039 -566.5434 -566.1820 -565.8197 -565.4564 -565.0922
#>  [967] -564.7270 -564.3610 -563.9941 -563.6263 -563.2576 -562.8880 -562.5176
#>  [974] -562.1462 -561.7740 -561.4010 -561.0271 -560.6523 -560.2766 -559.9001
#>  [981] -559.5227 -559.1445 -558.7654 -558.3854 -558.0045 -557.6228 -557.2402
#>  [988] -556.8567 -556.4723 -556.0869 -555.7007 -555.3136 -554.9255 -554.5364
#>  [995] -554.1465 -553.7555 -553.3636 -552.9707 -552.5767 -552.1818
#> 
#> $baseline_pupil_raw_deblink_detransient_interpolate_lpfilt_sub_bline_epoch_prePostProbe$block_1$baseline_cor_epochs[[5]]
#>    [1]   63.9059720   63.8509381   63.8017535   63.7583803   63.7207783
#>    [6]   63.6889054   63.6627173   63.6421674   63.6272072   63.6177860
#>   [11]   63.6138510   63.6153474   63.6222184   63.6344051   63.6518466
#>   [16]   63.6744801   63.7022408   63.7350619   63.7728748   63.8156090
#>   [21]   63.8631921   63.9155499   63.9726063   64.0342836   64.1005021
#>   [26]   64.1711807   64.2462363   64.3255843   64.4091384   64.4968108
#>   [31]   64.5885121   64.6841512   64.7836357   64.8868717   64.9937637
#>   [36]   65.1042152   65.2181278   65.3354023   65.4559378   65.5796324
#>   [41]   65.7063829   65.8360851   65.9686333   66.1039212   66.2418410
#>   [46]   66.3822842   66.5251413   66.6703018   66.8176543   66.9670866
#>   [51]   67.1184859   67.2717384   67.4267297   67.5833449   67.7414682
#>   [56]   67.9009835   68.0617740   68.2237227   68.3867120   68.5506239
#>   [61]   68.7153401   68.8807422   69.0467115   69.2131289   69.3798756
#>   [66]   69.5468323   69.7138801   69.8808997   70.0477722   70.2143788
#>   [71]   70.3806007   70.5463195   70.7114170   70.8757753   71.0392770
#>   [76]   71.2018051   71.3632430   71.5234747   71.6823848   71.8398585
#>   [81]   71.9957817   72.1500410   72.3025239   72.4531186   72.6017142
#>   [86]   72.7482008   72.8924696   73.0344125   73.1739228   73.3108947
#>   [91]   73.4452238   73.5768067   73.7055414   73.8313272   73.9540648
#>   [96]   74.0736562   74.1900049   74.3030159   74.4125959   74.5186529
#>  [101]   74.6210968   74.7198389   74.8147924   74.9058722   74.9929950
#>  [106]   75.0760794   75.1550457   75.2298163   75.3003153   75.3664691
#>  [111]   75.4282059   75.4854560   75.5381518   75.5862277   75.6296205
#>  [116]   75.6682689   75.7021141   75.7310992   75.7551699   75.7742740
#>  [121]   75.7883617   75.7973854   75.8013001   75.8000630   75.7936338
#>  [126]   75.7819746   75.7650501   75.7428271   75.7152753   75.6823666
#>  [131]   75.6440757   75.6003796   75.5512578   75.4966927   75.4366689
#>  [136]   75.3711737   75.3001970   75.2237314   75.1417717   75.0543158
#>  [141]   74.9613638   74.8629187   74.7589857   74.6495730   74.5346911
#>  [146]   74.4143534   74.2885754   74.1573757   74.0207750   73.8787970
#>  [151]   73.7314674   73.5788150   73.4208707   73.2576680   73.0892430
#>  [156]   72.9156341   72.7368824   72.5530310   72.3641257   72.1702147
#>  [161]   71.9713484   71.7675796   71.5589633   71.3455570   71.1274202
#>  [166]   70.9046146   70.6772043   70.4452553   70.2088358   69.9680162
#>  [171]   69.7228686   69.4734673   69.2198887   68.9622107   68.7005134
#>  [176]   68.4348786   68.1653899   67.8921326   67.6151937   67.3346618
#>  [181]   67.0506271   66.7631814   66.4724178   66.1784310   65.8813170
#>  [186]   65.5811731   65.2780980   64.9721915   64.6635544   64.3522888
#>  [191]   64.0384979   63.7222855   63.4037568   63.0830174   62.7601740
#>  [196]   62.4353339   62.1086050   61.7800959   61.4499157   61.1181739
#>  [201]   60.7849806   60.4504459   60.1146805   59.7777951   59.4399005
#>  [206]   59.1011077   58.7615276   58.4212711   58.0804488   57.7391713
#>  [211]   57.3975487   57.0556909   56.7137073   56.3717067   56.0297976
#>  [216]   55.6880877   55.3466838   55.0056923   54.6652185   54.3253669
#>  [221]   53.9862408   53.6479427   53.3105738   52.9742342   52.6390227
#>  [226]   52.3050366   51.9723722   51.6411238   51.3113846   50.9832459
#>  [231]   50.6567974   50.3321272   50.0093215   49.6884644   49.3696384
#>  [236]   49.0529239   48.7383991   48.4261403   48.1162213   47.8087140
#>  [241]   47.5036877   47.2012095   46.9013441   46.6041536   46.3096977
#>  [246]   46.0180332   45.7292147   45.4432939   45.1603196   44.8803381
#>  [251]   44.6033925   44.3295234   44.0587682   43.7911613   43.5267343
#>  [256]   43.2655155   43.0075302   42.7528006   42.5013455   42.2531807
#>  [261]   42.0083187   41.7667686   41.5285363   41.2936243   41.0620317
#>  [266]   40.8337542   40.6087840   40.3871101   40.1687177   39.9535887
#>  [271]   39.7417015   39.5330307   39.3275478   39.1252202   38.9260123
#>  [276]   38.7298845   38.5367937   38.3466934   38.1595332   37.9752593
#>  [281]   37.7938144   37.6151373   37.4391634   37.2658244   37.0950486
#>  [286]   36.9267606   36.7608815   36.5973287   36.4360162   36.2768545
#>  [291]   36.1197505   35.9646077   35.8113261   35.6598023   35.5099296
#>  [296]   35.3615976   35.2146929   35.0690987   34.9246947   34.7813576
#>  [301]   34.6389608   34.4973746   34.3564660   34.2160992   34.0761350
#>  [306]   33.9364314   33.7968435   33.6572235   33.5174206   33.3772814
#>  [311]   33.2366495   33.0953661   32.9532696   32.8101959   32.6659784
#>  [316]   32.5204480   32.3734332   32.2247605   32.0742536   31.9217345
#>  [321]   31.7670228   31.6099363   31.4502905   31.2878995   31.1225751
#>  [326]   30.9541275   30.7823655   30.6070960   30.4281244   30.2452549
#>  [331]   30.0582902   29.8670317   29.6712798   29.4708336   29.2654912
#>  [336]   29.0550499   28.8393062   28.6180557   28.3910933   28.1582136
#>  [341]   27.9192104   27.6738772   27.4220073   27.1633937   26.8978292
#>  [346]   26.6251068   26.3450193   26.0573598   25.7619216   25.4584982
#>  [351]   25.1468839   24.8268731   24.4982610   24.1608435   23.8144173
#>  [356]   23.4587799   23.0937300   22.7190670   22.3345918   21.9401065
#>  [361]   21.5354143   21.1203201   20.6946303   20.2581527   19.8106969
#>  [366]   19.3520745   18.8820987   18.4005848   17.9073500   17.4022139
#>  [371]   16.8849981   16.3555265   15.8136255   15.2591239   14.6918531
#>  [376]   14.1116469   13.5183422   12.9117782   12.2917974   11.6582449
#>  [381]   11.0109690   10.3498209    9.6746551    8.9853293    8.2817044
#>  [386]    7.5636446    6.8310176    6.0836945    5.3215501    4.5444626
#>  [391]    3.7523139    2.9449896    2.1223791    1.2843757    0.4308762
#>  [396]   -0.4382181   -1.3230026   -2.2235682   -3.1400019   -4.0723867
#>  [401]   -5.0208014   -5.9853207   -6.9660149   -7.9629503   -8.9761888
#>  [406]  -10.0057881  -11.0518014  -12.1142778  -13.1932619  -14.2887937
#>  [411]  -15.4009092  -16.5296397  -17.6750121  -18.8370489  -20.0157680
#>  [416]  -21.2111830  -22.4233028  -23.6521321  -24.8976709  -26.1599147
#>  [421]  -27.4388547  -28.7344774  -30.0467649  -31.3756949  -32.7212406
#>  [426]  -34.0833708  -35.4620497  -36.8572372  -38.2688890  -39.6969561
#>  [431]  -41.1413853  -42.6021191  -44.0790958  -45.5722491  -47.0815088
#>  [436]  -48.6068004  -50.1480451  -51.7051603  -53.2780588  -54.8666499
#>  [441]  -56.4708385  -58.0905257  -59.7256086  -61.3759807  -63.0415313
#>  [446]  -64.7221461  -66.4177072  -68.1280929  -69.8531779  -71.5928334
#>  [451]  -73.3469272  -75.1153235  -76.8978833  -78.6944642  -80.5049206
#>  [456]  -82.3291038  -84.1668619  -86.0180399  -87.8824802  -89.7600219
#>  [461]  -91.6505016  -93.5537529  -95.4696070  -97.3978922  -99.3384347
#>  [466] -101.2910579 -103.2555830 -105.2318289 -107.2196124 -109.2187481
#>  [471] -111.2290484 -113.2503242 -115.2823841 -117.3250350 -119.3780824
#>  [476] -121.4413298 -123.5145795 -125.5976320 -127.6902868 -129.7923418
#>  [481] -131.9035940 -134.0238392 -136.1528721 -138.2904865 -140.4364754
#>  [486] -142.5906311 -144.7527452 -146.9226085 -149.1000116 -151.2847445
#>  [491] -153.4765970 -155.6753585 -157.8808184 -160.0927659 -162.3109904
#>  [496] -164.5352810 -166.7654275 -169.0012195 -171.2424471 -173.4889009
#>  [501] -175.7403720 -177.9966518 -180.2575327 -182.5228077 -184.7922706
#>  [506] -187.0657159 -189.3429394 -191.6237378 -193.9079087 -196.1952512
#>  [511] -198.4855654 -200.7786528 -203.0743163 -205.3723603 -207.6725905
#>  [516] -209.9748145 -212.2788412 -214.5844814 -216.8915477 -219.1998545
#>  [521] -221.5092179 -223.8194561 -226.1303893 -228.4418396 -230.7536315
#>  [526] -233.0655912 -235.3775475 -237.6893312 -240.0007755 -242.3117159
#>  [531] -244.6219901 -246.9314386 -249.2399039 -251.5472314 -253.8532687
#>  [536] -256.1578661 -258.4608765 -260.7621554 -263.0615609 -265.3589538
#>  [541] -267.6541977 -269.9471588 -272.2377061 -274.5257113 -276.8110490
#>  [546] -279.0935964 -281.3732339 -283.6498442 -285.9233134 -288.1935300
#>  [551] -290.4603856 -292.7237746 -294.9835942 -297.2397447 -299.4921290
#>  [556] -301.7406531 -303.9852257 -306.2257584 -308.4621659 -310.6943654
#>  [561] -312.9222773 -315.1458245 -317.3649330 -319.5795315 -321.7895515
#>  [566] -323.9949274 -326.1955961 -328.3914977 -330.5825746 -332.7687722
#>  [571] -334.9500384 -337.1263239 -339.2975819 -341.4637684 -343.6248418
#>  [576] -345.7807632 -347.9314961 -350.0770067 -352.2172635 -354.3522374
#>  [581] -356.4819017 -358.6062323 -360.7252071 -362.8388065 -364.9470129
#>  [586] -367.0498113 -369.1471886 -371.2391337 -373.3256379 -375.4066944
#>  [591] -377.4822983 -379.5524468 -381.6171388 -383.6763755 -385.7301593
#>  [596] -387.7784949 -389.8213884 -391.8588477 -393.8908823 -395.9175034
#>  [601] -397.9387234 -399.9545565 -401.9650182 -403.9701253 -405.9698962
#>  [606] -407.9643502 -409.9535081 -411.9373917 -413.9160242 -415.8894295
#>  [611] -417.8576329 -419.8206603 -421.7785387 -423.7312961 -425.6789611
#>  [616] -427.6215632 -429.5591325 -431.4917000 -433.4192970 -435.3419556
#>  [621] -437.2597083 -439.1725883 -441.0806288 -442.9838639 -444.8823275
#>  [626] -446.7760541 -448.6650785 -450.5494354 -452.4291599 -454.3042870
#>  [631] -456.1748519 -458.0408898 -459.9024358 -461.7595250 -463.6121923
#>  [636] -465.4604724 -467.3044000 -469.1440095 -470.9793349 -472.8104101
#>  [641] -474.6372684 -476.4599428 -478.2784662 -480.0928705 -481.9031876
#>  [646] -483.7094487 -485.5116844 -487.3099247 -489.1041993 -490.8945368
#>  [651] -492.6809656 -494.4635132 -496.2422063 -498.0170711 -499.7881329
#>  [656] -501.5554163 -503.3189450 -505.0787421 -506.8348296 -508.5872290
#>  [661] -510.3359606 -512.0810440 -513.8224979 -515.5603401 -517.2945875
#>  [666] -519.0252560 -520.7523608 -522.4759159 -524.1959345 -525.9124288
#>  [671] -527.6254101 -529.3348888 -531.0408743 -532.7433749 -534.4423982
#>  [676] -536.1379506 -537.8300379 -539.5186646 -541.2038344 -542.8855502
#>  [681] -544.5638137 -546.2386260 -547.9099870 -549.5778960 -551.2423511
#>  [686] -552.9033498 -554.5608885 -556.2149631 -557.8655682 -559.5126981
#>  [691] -561.1563458 -562.7965040 -564.4331643 -566.0663176 -567.6959543
#>  [696] -569.3220639 -570.9446353 -572.5636566 -574.1791155 -575.7909990
#>  [701] -577.3992935 -579.0039848 -580.6050583 -582.2024987 -583.7962905
#>  [706] -585.3864174 -586.9728630 -588.5556103 -590.1346421 -591.7099407
#>  [711] -593.2814882 -594.8492664 -596.4132568 -597.9734408 -599.5297996
#>  [716] -601.0823141 -602.6309653 -604.1757338 -605.7166006 -607.2535463
#>  [721] -608.7865516 -610.3155973 -611.8406643 -613.3617335 -614.8787859
#>  [726] -616.3918029 -617.9007658 -619.4056564 -620.9064567 -622.4031488
#>  [731] -623.8957153 -625.3841392 -626.8684038 -628.3484928 -629.8243905
#>  [736] -631.2960814 -632.7635508 -634.2267843 -635.6857683 -637.1404896
#>  [741] -638.5909358 -640.0370949 -641.4789558 -642.9165080 -644.3497417
#>  [746] -645.7786480 -647.2032186 -648.6234462 -650.0393239 -651.4508463
#>  [751] -652.8580082 -654.2608058 -655.6592358 -657.0532962 -658.4429856
#>  [756] -659.8283039 -661.2092516 -662.5858305 -663.9580432 -665.3258935
#>  [761] -666.6893861 -668.0485267 -669.4033223 -670.7537808 -672.0999110
#>  [766] -673.4417231 -674.7792282 -676.1124386 -677.4413675 -678.7660296
#>  [771] -680.0864402 -681.4026162 -682.7145751 -684.0223360 -685.3259189
#>  [776] -686.6253448 -687.9206359 -689.2118155 -690.4989081 -691.7819391
#>  [781] -693.0609351 -694.3359236 -695.6069335 -696.8739944 -698.1371371
#>  [786] -699.3963934 -700.6517961 -701.9033791 -703.1511771 -704.3952259
#>  [791] -705.6355621 -706.8722235 -708.1052485 -709.3346766 -710.5605479
#>  [796] -711.7829038 -713.0017860 -714.2172373 -715.4293013 -716.6380221
#>  [801] -717.8434447 -719.0456147 -720.2445784 -721.4403827 -722.6330752
#>  [806] -723.8227038 -725.0093173 -726.1929646 -727.3736954 -728.5515596
#>  [811] -729.7266076 -730.8988902 -732.0684584 -733.2353635 -734.3996573
#>  [816] -735.5613914 -736.7206178 -737.8773888 -739.0317564 -740.1837729
#>  [821] -741.3334907 -742.4809619 -743.6262387 -744.7693732 -745.9104173
#>  [826] -747.0494227 -748.1864410 -749.3215232 -750.4547204 -751.5860830
#>  [831] -752.7156612 -753.8435046 -754.9696625 -756.0941835 -757.2171156
#>  [836] -758.3385064 -759.4584026 -760.5768505 -761.6938952 -762.8095815
#>  [841] -763.9239530 -765.0370528 -766.1489227 -767.2596037 -768.3691361
#>  [846] -769.4775587 -770.5849096 -771.6912255 -772.7965423 -773.9008944
#>  [851] -775.0043152 -776.1068367 -777.2084897 -778.3093036 -779.4093067
#>  [856] -780.5085255 -781.6069854 -782.7047102 -783.8017222 -784.8980423
#>  [861] -785.9936898 -787.0886823 -788.1830361 -789.2767655 -790.3698835
#>  [866] -791.4624012 -792.5543280 -793.6456718 -794.7364386 -795.8266325
#>  [871] -796.9162561 -798.0053100 -799.0937931 -800.1817026 -801.2690334
#>  [876] -802.3557791 -803.4419311 -804.5274790 -805.6124105 -806.6967116
#>  [881] -807.7803662 -808.8633562 -809.9456620 -811.0272617 -812.1081316
#>  [886] -813.1882464 -814.2675785 -815.3460985 -816.4237754 -817.5005758
#>  [891] -818.5764650 -819.6514061 -820.7253603 -821.7982872 -822.8701443
#>  [896] -823.9408877 -825.0104712 -826.0788472 -827.1459663 -828.2117772
#>  [901] -829.2762270 -830.3392611 -831.4008233 -832.4608558 -833.5192989
#>  [906] -834.5760918 -835.6311717 -836.6844746 -837.7359350 -838.7854857
#>  [911] -839.8330584 -840.8785833 -841.9219893 -842.9632040 -844.0021538
#>  [916] -845.0387637 -846.0729578 -847.1046590 -848.1337891 -849.1602688
#>  [921] -850.1840180 -851.2049556 -852.2229996 -853.2380671 -854.2500745
#>  [926] -855.2589377 -856.2645714 -857.2668903 -858.2658081 -859.2612382
#>  [931] -860.2530934 -861.2412863 -862.2257290 -863.2063334 -864.1830112
#>  [936] -865.1556740 -866.1242331 -867.0885999 -868.0486858 -869.0044023
#>  [941] -869.9556611 -870.9023738 -871.8444528 -872.7818102 -873.7143591
#>  [946] -874.6420125 -875.5646843 -876.4822887 -877.3947408 -878.3019561
#>  [951] -879.2038512 -880.1003431 -880.9913500 -881.8767908 -882.7565857
#>  [956] -883.6306556 -884.4989226 -885.3613103 -886.2177429 -887.0681466
#>  [961] -887.9124482 -888.7505766 -889.5824615 -890.4080346 -891.2272289
#>  [966] -892.0399791 -892.8462214 -893.6458940 -894.4389364 -895.2252904
#>  [971] -896.0048994 -896.7777087 -897.5436654 -898.3027189 -899.0548205
#>  [976] -899.7999234 -900.5379830 -901.2689570 -901.9928050 -902.7094891
#>  [981] -903.4189735 -904.1212246 -904.8162113 -905.5039046 -906.1842781
#>  [986] -906.8573077 -907.5229718 -908.1812510 -908.8321286 -909.4755903
#>  [991] -910.1116243 -910.7402214 -911.3613748 -911.9750802 -912.5813361
#>  [996] -913.1801434 -913.7715055 -914.3554285 -914.9319211 -915.5009945
#> 
#> 
#> $baseline_pupil_raw_deblink_detransient_interpolate_lpfilt_sub_bline_epoch_prePostProbe$block_1$baseline_means_by_epoch
#> [1] 6227.703 6287.244 5571.891 6094.619 6901.673
#> 
#> $baseline_pupil_raw_deblink_detransient_interpolate_lpfilt_sub_bline_epoch_prePostProbe$block_1$baseline_correction_method
#> [1] "subtractive"
#> 
#> $baseline_pupil_raw_deblink_detransient_interpolate_lpfilt_sub_bline_epoch_prePostProbe$block_1$baseline_cor_col_name
#> [1] "pupil_raw_deblink_detransient_interpolate_lpfilt_sub_bline"
#> 
#> $baseline_pupil_raw_deblink_detransient_interpolate_lpfilt_sub_bline_epoch_prePostProbe$block_1$info
#> $baseline_pupil_raw_deblink_detransient_interpolate_lpfilt_sub_bline_epoch_prePostProbe$block_1$info$calc_baseline
#> [1] TRUE
#> 
#> $baseline_pupil_raw_deblink_detransient_interpolate_lpfilt_sub_bline_epoch_prePostProbe$block_1$info$apply_baseline
#> [1] TRUE
#> 
#> $baseline_pupil_raw_deblink_detransient_interpolate_lpfilt_sub_bline_epoch_prePostProbe$block_1$info$baseline_type
#> [1] "sub"
#> 
#> $baseline_pupil_raw_deblink_detransient_interpolate_lpfilt_sub_bline_epoch_prePostProbe$block_1$info$baseline_events
#> [1] "DELAY_STOP_*"
#> 
#> $baseline_pupil_raw_deblink_detransient_interpolate_lpfilt_sub_bline_epoch_prePostProbe$block_1$info$baseline_period
#> [1] -1  0
#> 
#> 
#> 
#> 
#> attr(,"class")
#> [1] "eyeris"

# example 8: use mean of time period between set start/end event messages
# (i.e. between "DELAY_START" and "DELAY_STOP"). In this case, the
# `baseline_period` argument will be ignored since both a "start" and "end"
# message string are provided to the `baseline_events` argument.
eye_preproc |>
  eyeris::epoch(
    events = "PROBE_START_{trial}",
    limits = c(0, 1), # grab 0 seconds prior to and 1 second post PROBE event
    label = "prePostProbe", # custom epoch label name
    calc_baseline = TRUE,
    apply_baseline = TRUE,
    baseline_type = "sub", # "sub"tractive baseline calculation is default
    baseline_events = c(
      "DELAY_START_*",
      "DELAY_STOP_*"
    )
  )
#>  Epoching and baselining pupil data...
#>  Block 1: found 5 matching events for PROBESTARTtrial
#>  Done!
#>  Block 1: pupil data from 5 unique event messages extracted
#>  Block 1: 5 epochs baselined
#>  Pupil epoching and baselining completed in 0.06 secs
#> $file
#> [1] "/home/sts/R/x86_64-pc-linux-gnu-library/4.3/eyeris/extdata/memory.asc"
#> 
#> $timeseries
#> $timeseries$block_1
#> # A tibble: 20,767 × 13
#>    block time_orig eye_x eye_y eye      hz type     pupil_raw pupil_raw_deblink
#>    <dbl>     <int> <dbl> <dbl> <chr> <dbl> <chr>        <dbl>             <dbl>
#>  1     1  11334491  982.  555. R      1000 diameter      6198              6198
#>  2     1  11334492  981.  554. R      1000 diameter      6201              6201
#>  3     1  11334493  981   553. R      1000 diameter      6201              6201
#>  4     1  11334494  981.  554. R      1000 diameter      6202              6202
#>  5     1  11334495  981.  554. R      1000 diameter      6202              6202
#>  6     1  11334496  981.  553  R      1000 diameter      6200              6200
#>  7     1  11334497  982.  551. R      1000 diameter      6198              6198
#>  8     1  11334498  983   550. R      1000 diameter      6196              6196
#>  9     1  11334499  984.  551. R      1000 diameter      6196              6196
#> 10     1  11334500  983.  552. R      1000 diameter      6199              6199
#> # ℹ 20,757 more rows
#> # ℹ 4 more variables: pupil_raw_deblink_detransient <dbl>,
#> #   pupil_raw_deblink_detransient_interpolate <dbl>,
#> #   pupil_raw_deblink_detransient_interpolate_lpfilt <dbl>,
#> #   pupil_raw_deblink_detransient_interpolate_lpfilt_z <dbl>
#> 
#> 
#> $events
#> $events$block_1
#> # A tibble: 67 × 3
#>    block     time text                      
#>    <dbl>    <dbl> <chr>                     
#>  1     1 11242177 !MODE RECORD CR 1000 2 1 R
#>  2     1 11334491 EXP_START                 
#>  3     1 11334491 TRIALID 22                
#>  4     1 11334491 START_TRIAL_22            
#>  5     1 11334491 CUE_START_22              
#>  6     1 11335466 CUE_STOP_22               
#>  7     1 11335467 DELAY_START_22            
#>  8     1 11336473 DELAY_STOP_22             
#>  9     1 11336474 PROBE_START_22            
#> 10     1 11337158 RESPONSE_22               
#> # ℹ 57 more rows
#> 
#> 
#> $blinks
#> $blinks$block_1
#> # A tibble: 1 × 5
#>   block    stime    etime   dur eye  
#>   <dbl>    <dbl>    <dbl> <dbl> <fct>
#> 1     1 11348253 11348308    56 R    
#> 
#> 
#> $info
#>                  date        model version sample.rate   cr  left right mono
#> 1 2009-01-11 02:40:47 EyeLink 1000   4.594        1000 TRUE FALSE  TRUE TRUE
#>   screen.x screen.y                                 mount filter.level
#> 1     1920     1080 Desktop / Monocular / Head Stabilized            2
#>   sample.dtype event.dtype pupil.dtype velocity resolution htarg input buttons
#> 1         GAZE        GAZE    DIAMETER    FALSE      FALSE FALSE  TRUE   FALSE
#> 
#> $latest
#> [1] "pupil_raw_deblink_detransient_interpolate_lpfilt_z_epoch"
#> 
#> $params
#> $params$deblink
#> pkgdown::build_site_github_pages(clean = TRUE, install = FALSE, 
#>     new_process = FALSE)
#> 
#> $params$detransient
#> pkgdown::build_site_github_pages(clean = TRUE, install = FALSE, 
#>     new_process = FALSE)
#> 
#> $params$interpolate
#> pkgdown::build_site_github_pages(clean = TRUE, install = FALSE, 
#>     new_process = FALSE)
#> 
#> $params$lpfilt
#> pkgdown::build_site_github_pages(clean = TRUE, install = FALSE, 
#>     new_process = FALSE)
#> 
#> $params$z
#> pkgdown::build_site_github_pages(clean = TRUE, install = FALSE, 
#>     new_process = FALSE)
#> 
#> $params$epoch
#> pkgdown::build_site_github_pages(clean = TRUE, install = FALSE, 
#>     new_process = FALSE)
#> 
#> 
#> $epoch_prePostProbe
#> $epoch_prePostProbe$block_1
#> # A tibble: 5,000 × 20
#>    block time_orig timebin eye_x eye_y eye      hz type     pupil_raw
#>    <dbl>     <int>   <dbl> <dbl> <dbl> <chr> <dbl> <chr>        <dbl>
#>  1     1  11336474 0        972.  550. R      1000 diameter      6513
#>  2     1  11336475 0.00100  971.  551. R      1000 diameter      6512
#>  3     1  11336476 0.00200  970.  551. R      1000 diameter      6512
#>  4     1  11336477 0.00300  970.  550. R      1000 diameter      6512
#>  5     1  11336478 0.00400  971.  548. R      1000 diameter      6514
#>  6     1  11336479 0.00501  972.  547. R      1000 diameter      6516
#>  7     1  11336480 0.00601  972.  548. R      1000 diameter      6518
#>  8     1  11336481 0.00701  972.  548. R      1000 diameter      6518
#>  9     1  11336482 0.00801  972.  550. R      1000 diameter      6518
#> 10     1  11336483 0.00901  972.  550. R      1000 diameter      6517
#> # ℹ 4,990 more rows
#> # ℹ 11 more variables: pupil_raw_deblink <dbl>,
#> #   pupil_raw_deblink_detransient <dbl>,
#> #   pupil_raw_deblink_detransient_interpolate <dbl>,
#> #   pupil_raw_deblink_detransient_interpolate_lpfilt <dbl>,
#> #   pupil_raw_deblink_detransient_interpolate_lpfilt_z <dbl>, template <chr>,
#> #   matching_pattern <chr>, matched_event <chr>, trial <chr>, …
#> 
#> 
#> $baseline_pupil_raw_deblink_detransient_interpolate_lpfilt_sub_bline_epoch_prePostProbe
#> $baseline_pupil_raw_deblink_detransient_interpolate_lpfilt_sub_bline_epoch_prePostProbe$block_1
#> $baseline_pupil_raw_deblink_detransient_interpolate_lpfilt_sub_bline_epoch_prePostProbe$block_1$baseline_cor_epochs
#> $baseline_pupil_raw_deblink_detransient_interpolate_lpfilt_sub_bline_epoch_prePostProbe$block_1$baseline_cor_epochs[[1]]
#>    [1]  272.8642869  274.0718324  275.2840447  276.5008586  277.7222079
#>    [6]  278.9480256  280.1782436  281.4127929  282.6516037  283.8946054
#>   [11]  285.1417266  286.3928948  287.6480371  288.9070798  290.1699483
#>   [16]  291.4365674  292.7068615  293.9807539  295.2581677  296.5390252
#>   [21]  297.8232483  299.1107583  300.4014761  301.6953218  302.9922156
#>   [26]  304.2920769  305.5948249  306.9003783  308.2086556  309.5195748
#>   [31]  310.8330540  312.1490108  313.4673624  314.7880263  316.1109193
#>   [36]  317.4359584  318.7630604  320.0921420  321.4231198  322.7559104
#>   [41]  324.0904303  325.4265962  326.7643246  328.1035323  329.4441360
#>   [46]  330.7860525  332.1291988  333.4734922  334.8188498  336.1651893
#>   [51]  337.5124283  338.8604848  340.2092772  341.5587239  342.9087437
#>   [56]  344.2592559  345.6101799  346.9614356  348.3129433  349.6646238
#>   [61]  351.0163980  352.3681876  353.7199145  355.0715013  356.4228710
#>   [66]  357.7739471  359.1246536  360.4749152  361.8246570  363.1738047
#>   [71]  364.5222848  365.8700242  367.2169504  368.5629917  369.9080771
#>   [76]  371.2521360  372.5950987  373.9368961  375.2774599  376.6167224
#>   [81]  377.9546168  379.2910768  380.6260371  381.9594329  383.2912005
#>   [86]  384.6212766  385.9495991  387.2761064  388.6007377  389.9234333
#>   [91]  391.2441340  392.5627817  393.8793189  395.1936891  396.5058365
#>   [96]  397.8157064  399.1232448  400.4283985  401.7311153  403.0313439
#>  [101]  404.3290336  405.6241350  406.9165993  408.2063787  409.4934262
#>  [106]  410.7776957  412.0591421  413.3377212  414.6133895  415.8861046
#>  [111]  417.1558249  418.4225098  419.6861194  420.9466149  422.2039583
#>  [116]  423.4581124  424.7090412  425.9567093  427.2010822  428.4421266
#>  [121]  429.6798096  430.9140996  432.1449657  433.3723779  434.5963070
#>  [126]  435.8167248  437.0336040  438.2469179  439.4566410  440.6627483
#>  [131]  441.8652159  443.0640207  444.2591403  445.4505534  446.6382392
#>  [136]  447.8221779  449.0023506  450.1787390  451.3513257  452.5200941
#>  [141]  453.6850284  454.8461135  456.0033352  457.1566799  458.3061349
#>  [146]  459.4516881  460.5933284  461.7310452  462.8648287  463.9946697
#>  [151]  465.1205600  466.2424917  467.3604580  468.4744525  469.5844695
#>  [156]  470.6905042  471.7925521  472.8906096  473.9846737  475.0747418
#>  [161]  476.1608123  477.2428839  478.3209560  479.3950286  480.4651022
#>  [166]  481.5311780  482.5932577  483.6513434  484.7054378  485.7555444
#>  [171]  486.8016668  487.8438093  488.8819767  489.9161743  490.9464077
#>  [176]  491.9726831  492.9950072  494.0133869  495.0278297  496.0383434
#>  [181]  497.0449365  498.0476174  499.0463951  500.0412792  501.0322792
#>  [186]  502.0194052  503.0026676  503.9820770  504.9576445  505.9293813
#>  [191]  506.8972988  507.8614089  508.8217235  509.7782550  510.7310157
#>  [196]  511.6800184  512.6252758  513.5668009  514.5046070  515.4387073
#>  [201]  516.3691152  517.2958444  518.2189084  519.1383210  520.0540961
#>  [206]  520.9662473  521.8747887  522.7797341  523.6810975  524.5788928
#>  [211]  525.4731338  526.3638344  527.2510084  528.1346695  529.0148313
#>  [216]  529.8915073  530.7647109  531.6344553  532.5007537  533.3636189
#>  [221]  534.2230637  535.0791006  535.9317417  536.7809993  537.6268850
#>  [226]  538.4694103  539.3085864  540.1444241  540.9769340  541.8061262
#>  [231]  542.6320106  543.4545964  544.2738928  545.0899081  545.9026506
#>  [236]  546.7121279  547.5183469  548.3213145  549.1210366  549.9175188
#>  [241]  550.7107660  551.5007827  552.2875725  553.0711386  553.8514835
#>  [246]  554.6286089  555.4025160  556.1732052  556.9406761  557.7049276
#>  [251]  558.4659578  559.2237642  559.9783431  560.7296903  561.4778006
#>  [256]  562.2226679  562.9642854  563.7026450  564.4377381  565.1695547
#>  [261]  565.8980842  566.6233149  567.3452338  568.0638273  568.7790804
#>  [266]  569.4909771  570.1995004  570.9046322  571.6063530  572.3046424
#>  [271]  572.9994788  573.6908392  574.3786995  575.0630346  575.7438177
#>  [276]  576.4210211  577.0946155  577.7645706  578.4308547  579.0934344
#>  [281]  579.7522755  580.4073421  581.0585969  581.7060013  582.3495151
#>  [286]  582.9890970  583.6247039  584.2562914  584.8838136  585.5072231
#>  [291]  586.1264710  586.7415069  587.3522787  587.9587331  588.5608148
#>  [296]  589.1584674  589.7516326  590.3402506  590.9242600  591.5035979
#>  [301]  592.0781997  592.6479991  593.2129284  593.7729180  594.3278970
#>  [306]  594.8777925  595.4225302  595.9620342  596.4962266  597.0250283
#>  [311]  597.5483582  598.0661338  598.5782708  599.0846833  599.5852837
#>  [316]  600.0799828  600.5686898  601.0513123  601.5277561  601.9979255
#>  [321]  602.4617232  602.9190502  603.3698060  603.8138885  604.2511938
#>  [326]  604.6816168  605.1050506  605.5213869  605.9305156  606.3323255
#>  [331]  606.7267035  607.1135353  607.4927050  607.8640953  608.2275875
#>  [336]  608.5830615  608.9303957  609.2694672  609.6001519  609.9223243
#>  [341]  610.2358575  610.5406235  610.8364930  611.1233355  611.4010193
#>  [346]  611.6694116  611.9283785  612.1777851  612.4174951  612.6473717
#>  [351]  612.8672767  613.0770711  613.2766152  613.4657681  613.6443882
#>  [356]  613.8123331  613.9694599  614.1156245  614.2506826  614.3744890
#>  [361]  614.4868980  614.5877634  614.6769384  614.7542760  614.8196286
#>  [366]  614.8728482  614.9137866  614.9422955  614.9582261  614.9614296
#>  [371]  614.9517572  614.9290600  614.8931889  614.8439951  614.7813299
#>  [376]  614.7050447  614.6149910  614.5110209  614.3929865  614.2607406
#>  [381]  614.1141361  613.9530267  613.7772666  613.5867106  613.3812141
#>  [386]  613.1606333  612.9248253  612.6736480  612.4069600  612.1246213
#>  [391]  611.8264926  611.5124358  611.1823141  610.8359916  610.4733341
#>  [396]  610.0942084  609.6984829  609.2860274  608.8567131  608.4104131
#>  [401]  607.9470019  607.4663558  606.9683527  606.4528727  605.9197973
#>  [406]  605.3690105  604.8003978  604.2138471  603.6092482  602.9864933
#>  [411]  602.3454768  601.6860952  601.0082475  600.3118352  599.5967621
#>  [416]  598.8629346  598.1102617  597.3386550  596.5480288  595.7383001
#>  [421]  594.9093887  594.0612174  593.1937115  592.3067997  591.4004133
#>  [426]  590.4744870  589.5289581  588.5637676  587.5788592  586.5741800
#>  [431]  585.5496803  584.5053140  583.4410377  582.3568121  581.2526007
#>  [436]  580.1283709  578.9840933  577.8197422  576.6352953  575.4307339
#>  [441]  574.2060431  572.9612115  571.6962313  570.4110985  569.1058128
#>  [446]  567.7803776  566.4348002  565.0690915  563.6832663  562.2773432
#>  [451]  560.8513448  559.4052971  557.9392306  556.4531791  554.9471806
#>  [456]  553.4212769  551.8755137  550.3099407  548.7246113  547.1195830
#>  [461]  545.4949171  543.8506789  542.1869374  540.5037658  538.8012410
#>  [466]  537.0794437  535.3384587  533.5783745  531.7992834  530.0012818
#>  [471]  528.1844696  526.3489507  524.4948326  522.6222268  520.7312483
#>  [476]  518.8220159  516.8946522  514.9492832  512.9860387  511.0050521
#>  [481]  509.0064602  506.9904035  504.9570259  502.9064749  500.8389010
#>  [486]  498.7544587  496.6533052  494.5356014  492.4015113  490.2512021
#>  [491]  488.0848441  485.9026109  483.7046790  481.4912277  479.2624397
#>  [496]  477.0185001  474.7595973  472.4859221  470.1976683  467.8950321
#>  [501]  465.5782125  463.2474111  460.9028316  458.5446806  456.1731667
#>  [506]  453.7885010  451.3908966  448.9805691  446.5577357  444.1226161
#>  [511]  441.6754316  439.2164056  436.7457632  434.2637312  431.7705381
#>  [516]  429.2664141  426.7515907  424.2263010  421.6907794  419.1452616
#>  [521]  416.5899846  414.0251864  411.4511062  408.8679840  406.2760610
#>  [526]  403.6755790  401.0667805  398.4499090  395.8252083  393.1929229
#>  [531]  390.5532976  387.9065777  385.2530088  382.5928366  379.9263070
#>  [536]  377.2536661  374.5751597  371.8910337  369.2015338  366.5069055
#>  [541]  363.8073940  361.1032439  358.3946996  355.6820049  352.9654028
#>  [546]  350.2451358  347.5214456  344.7945731  342.0647582  339.3322400
#>  [551]  336.5972562  333.8600439  331.1208387  328.3798750  325.6373859
#>  [556]  322.8936031  320.1487570  317.4030762  314.6567882  311.9101184
#>  [561]  309.1632907  306.4165274  303.6700488  300.9240734  298.1788177
#>  [566]  295.4344965  292.6913222  289.9495053  287.2092543  284.4707753
#>  [571]  281.7342723  278.9999470  276.2679987  273.5386245  270.8120189
#>  [576]  268.0883741  265.3678798  262.6507229  259.9370882  257.2271575
#>  [581]  254.5211101  251.8191226  249.1213691  246.4280205  243.7392455
#>  [586]  241.0552095  238.3760755  235.7020032  233.0331499  230.3696698
#>  [591]  227.7117141  225.0594311  222.4129663  219.7724622  217.1380581
#>  [596]  214.5098907  211.8880933  209.2727964  206.6641275  204.0622110
#>  [601]  201.4671682  198.8791175  196.2981743  193.7244507  191.1580561
#>  [606]  188.5990965  186.0476751  183.5038920  180.9678443  178.4396261
#>  [611]  175.9193284  173.4070393  170.9028437  168.4068237  165.9190585
#>  [616]  163.4396242  160.9685940  158.5060381  156.0520240  153.6066161
#>  [621]  151.1698761  148.7418628  146.3226322  143.9122374  141.5107288
#>  [626]  139.1181541  136.7345583  134.3599835  131.9944695  129.6380530
#>  [631]  127.2907686  124.9526481  122.6237205  120.3040127  117.9935490
#>  [636]  115.6923513  113.4004388  111.1178287  108.8445358  106.5805725
#>  [641]  104.3259489  102.0806731   99.8447509   97.6181858   95.4009796
#>  [646]   93.1931315   90.9946393   88.8054983   86.6257022   84.4552426
#>  [651]   82.2941094   80.1422905   77.9997723   75.8665393   73.7425743
#>  [656]   71.6278587   69.5223719   67.4260920   65.3389958   63.2610582
#>  [661]   61.1922530   59.1325524   57.0819275   55.0403480   53.0077823
#>  [666]   50.9841977   48.9695602   46.9638349   44.9669855   42.9789751
#>  [671]   40.9997655   39.0293175   37.0675913   35.1145460   33.1701399
#>  [676]   31.2343306   29.3070748   27.3883288   25.4780478   23.5761868
#>  [681]   21.6826998   19.7975407   17.9206625   16.0520179   14.1915592
#>  [686]   12.3392381   10.4950061    8.6588144    6.8306136    5.0103543
#>  [691]    3.1979869    1.3934614   -0.4032724   -2.1922646   -3.9735656
#>  [696]   -5.7472259   -7.5132961   -9.2718267  -11.0228682  -12.7664713
#>  [701]  -14.5026864  -16.2315640  -17.9531546  -19.6675083  -21.3746752
#>  [706]  -23.0747055  -24.7676489  -26.4535550  -28.1324733  -29.8044529
#>  [711]  -31.4695428  -33.1277918  -34.7792481  -36.4239601  -38.0619755
#>  [716]  -39.6933418  -41.3181064  -42.9363160  -44.5480171  -46.1532561
#>  [721]  -47.7520787  -49.3445303  -50.9306560  -52.5105006  -54.0841084
#>  [726]  -55.6515232  -57.2127886  -58.7679478  -60.3170434  -61.8601178
#>  [731]  -63.3972129  -64.9283703  -66.4536310  -67.9730358  -69.4866250
#>  [736]  -70.9944385  -72.4965159  -73.9928962  -75.4836183  -76.9687206
#>  [741]  -78.4482409  -79.9222170  -81.3906861  -82.8536851  -84.3112505
#>  [746]  -85.7634187  -87.2102253  -88.6517061  -90.0878962  -91.5188306
#>  [751]  -92.9445439  -94.3650704  -95.7804442  -97.1906992  -98.5958689
#>  [756]  -99.9959865 -101.3910852 -102.7811978 -104.1663570 -105.5465952
#>  [761] -106.9219447 -108.2924376 -109.6581058 -111.0189811 -112.3750953
#>  [766] -113.7264797 -115.0731659 -116.4151852 -117.7525689 -119.0853481
#>  [771] -120.4135539 -121.7372176 -123.0563700 -124.3710423 -125.6812654
#>  [776] -126.9870704 -128.2884884 -129.5855505 -130.8782876 -132.1667311
#>  [781] -133.4509121 -134.7308619 -136.0066120 -137.2781938 -138.5456388
#>  [786] -139.8089788 -141.0682455 -142.3234710 -143.5746873 -144.8219266
#>  [791] -146.0652212 -147.3046038 -148.5401070 -149.7717638 -150.9996070
#>  [796] -152.2236700 -153.4439863 -154.6605893 -155.8735130 -157.0827913
#>  [801] -158.2884584 -159.4905487 -160.6890969 -161.8841378 -163.0757064
#>  [806] -164.2638378 -165.4485676 -166.6299314 -167.8079649 -168.9827043
#>  [811] -170.1541857 -171.3224456 -172.4875205 -173.6494473 -174.8082628
#>  [816] -175.9640043 -177.1167089 -178.2664142 -179.4131576 -180.5569770
#>  [821] -181.6979102 -182.8359951 -183.9712698 -185.1037726 -186.2335416
#>  [826] -187.3606151 -188.4850317 -189.6068297 -190.7260476 -191.8427239
#>  [831] -192.9568972 -194.0686058 -195.1778884 -196.2847832 -197.3893287
#>  [836] -198.4915633 -199.5915250 -200.6892520 -201.7847822 -202.8781536
#>  [841] -203.9694037 -205.0585700 -206.1456897 -207.2308000 -208.3139376
#>  [846] -209.3951390 -210.4744405 -211.5518781 -212.6274873 -213.7013033
#>  [851] -214.7733612 -215.8436952 -216.9123397 -217.9793281 -219.0446936
#>  [856] -220.1084690 -221.1706863 -222.2313774 -223.2905732 -224.3483043
#>  [861] -225.4046006 -226.4594914 -227.5130055 -228.5651708 -229.6160147
#>  [866] -230.6655637 -231.7138437 -232.7608800 -233.8066967 -234.8513176
#>  [871] -235.8947653 -236.9370617 -237.9782279 -239.0182842 -240.0572496
#>  [876] -241.0951427 -242.1319808 -243.1677804 -244.2025569 -245.2363249
#>  [881] -246.2690979 -247.3008883 -248.3317075 -249.3615658 -250.3904727
#>  [886] -251.4184361 -252.4454632 -253.4715600 -254.4967313 -255.5209807
#>  [891] -256.5443108 -257.5667228 -258.5882171 -259.6087925 -260.6284468
#>  [896] -261.6471765 -262.6649770 -263.6818425 -264.6977657 -265.7127384
#>  [901] -266.7267509 -267.7397923 -268.7518506 -269.7629124 -270.7729630
#>  [906] -271.7819866 -272.7899661 -273.7968830 -274.8027176 -275.8074491
#>  [911] -276.8110552 -277.8135125 -278.8147965 -279.8148810 -280.8137390
#>  [916] -281.8113421 -282.8076606 -283.8026638 -284.7963196 -285.7885948
#>  [921] -286.7794549 -287.7688644 -288.7567865 -289.7431834 -290.7280160
#>  [926] -291.7112441 -292.6928265 -293.6727208 -294.6508837 -295.6272707
#>  [931] -296.6018363 -297.5745339 -298.5453160 -299.5141342 -300.4809390
#>  [936] -301.4456801 -302.4083062 -303.3687651 -304.3270037 -305.2829683
#>  [941] -306.2366041 -307.1878557 -308.1366669 -309.0829807 -310.0267395
#>  [946] -310.9678849 -311.9063579 -312.8420991 -313.7750481 -314.7051442
#>  [951] -315.6323262 -316.5565322 -317.4777001 -318.3957672 -319.3106703
#>  [956] -320.2223460 -321.1307306 -322.0357599 -322.9373696 -323.8354950
#>  [961] -324.7300714 -325.6210337 -326.5083168 -327.3918554 -328.2715844
#>  [966] -329.1474382 -330.0193516 -330.8872593 -331.7510960 -332.6107965
#>  [971] -333.4662959 -334.3175293 -335.1644319 -336.0069396 -336.8449880
#>  [976] -337.6785133 -338.5074521 -339.3317413 -340.1513180 -340.9661200
#>  [981] -341.7760856 -342.5811533 -343.3812624 -344.1763527 -344.9663646
#>  [986] -345.7512390 -346.5309177 -347.3053430 -348.0744580 -348.8382065
#>  [991] -349.5965330 -350.3493831 -351.0967030 -351.8384397 -352.5745413
#>  [996] -353.3049566 -354.0296355 -354.7485288 -355.4615883 -356.1687669
#> 
#> $baseline_pupil_raw_deblink_detransient_interpolate_lpfilt_sub_bline_epoch_prePostProbe$block_1$baseline_cor_epochs[[2]]
#>    [1]  249.4251613  250.0353986  250.6489659  251.2659340  251.8863728
#>    [6]  252.5103513  253.1379374  253.7691982  254.4041995  255.0430062
#>   [11]  255.6856820  256.3322896  256.9828902  257.6375439  258.2963097
#>   [16]  258.9592451  259.6264062  260.2978480  260.9736237  261.6537854
#>   [21]  262.3383836  263.0274672  263.7210837  264.4192789  265.1220971
#>   [26]  265.8295809  266.5417712  267.2587073  267.9804268  268.7069655
#>   [31]  269.4383572  270.1746344  270.9158273  271.6619646  272.4130729
#>   [36]  273.1691769  273.9302996  274.6964619  275.4676829  276.2439794
#>   [41]  277.0253667  277.8118577  278.6034634  279.4001930  280.2020532
#>   [46]  281.0090491  281.8211835  282.6384571  283.4608687  284.2884149
#>   [51]  285.1210903  285.9588872  286.8017959  287.6498048  288.5029000
#>   [56]  289.3610654  290.2242831  291.0925328  291.9657924  292.8440374
#>   [61]  293.7272416  294.6153763  295.5084111  296.4063134  297.3090485
#>   [66]  298.2165798  299.1288685  300.0458742  300.9675540  301.8938634
#>   [71]  302.8247559  303.7601830  304.7000942  305.6444375  306.5931586
#>   [76]  307.5462016  308.5035088  309.4650207  310.4306761  311.4004120
#>   [81]  312.3741637  313.3518649  314.3334478  315.3188427  316.3079787
#>   [86]  317.3007832  318.2971822  319.2971000  320.3004600  321.3071838
#>   [91]  322.3171918  323.3304033  324.3467362  325.3661072  326.3884319
#>   [96]  327.4136249  328.4415995  329.4722683  330.5055427  331.5413334
#>  [101]  332.5795499  333.6201014  334.6628958  335.7078408  336.7548430
#>  [106]  337.8038086  338.8546433  339.9072522  340.9615400  342.0174110
#>  [111]  343.0747692  344.1335182  345.1935614  346.2548022  347.3171437
#>  [116]  348.3804889  349.4447410  350.5098031  351.5755783  352.6419700
#>  [121]  353.7088819  354.7762178  355.8438819  356.9117787  357.9798133
#>  [126]  359.0478910  360.1159180  361.1838008  362.2514467  363.3187637
#>  [131]  364.3856605  365.4520466  366.5178325  367.5829294  368.6472496
#>  [136]  369.7107064  370.7732142  371.8346884  372.8950456  373.9542038
#>  [141]  375.0120820  376.0686005  377.1236812  378.1772472  379.2292231
#>  [146]  380.2795349  381.3281102  382.3748782  383.4197696  384.4627168
#>  [151]  385.5036538  386.5425165  387.5792423  388.6137706  389.6460425
#>  [156]  390.6760009  391.7035907  392.7287587  393.7514536  394.7716259
#>  [161]  395.7892284  396.8042156  397.8165442  398.8261730  399.8330626
#>  [166]  400.8371761  401.8384783  402.8369364  403.8325195  404.8251991
#>  [171]  405.8149485  406.8017436  407.7855620  408.7663838  409.7441912
#>  [176]  410.7189685  411.6907022  412.6593809  413.6249956  414.5875392
#>  [181]  415.5470070  416.5033961  417.4567060  418.4069383  419.3540967
#>  [186]  420.2981869  421.2392168  422.1771962  423.1121370  424.0440533
#>  [191]  424.9729608  425.8988776  426.8218233  427.7418197  428.6588905
#>  [196]  429.5730610  430.4843584  431.3928117  432.2984517  433.2013107
#>  [201]  434.1014229  434.9988238  435.8935507  436.7856423  437.6751389
#>  [206]  438.5620820  439.4465145  440.3284809  441.2080267  442.0851985
#>  [211]  442.9600443  443.8326131  444.7029549  445.5711208  446.4371624
#>  [216]  447.3011328  448.1630852  449.0230740  449.8811540  450.7373807
#>  [221]  451.5918100  452.4444984  453.2955025  454.1448795  454.9926865
#>  [226]  455.8389811  456.6838207  457.5272628  458.3693648  459.2101840
#>  [231]  460.0497772  460.8882014  461.7255126  462.5617669  463.3970193
#>  [236]  464.2313246  465.0647366  465.8973085  466.7290925  467.5601398
#>  [241]  468.3905007  469.2202243  470.0493584  470.8779497  471.7060433
#>  [246]  472.5336829  473.3609109  474.1877677  475.0142923  475.8405218
#>  [251]  476.6664913  477.4922342  478.3177817  479.1431630  479.9684050
#>  [256]  480.7935323  481.6185673  482.4435300  483.2684377  484.0933052
#>  [261]  484.9181449  485.7429661  486.5677754  487.3925768  488.2173711
#>  [266]  489.0421561  489.8669266  490.6916743  491.5163875  492.3410515
#>  [271]  493.1656481  493.9901558  494.8145494  495.6388005  496.4628770
#>  [276]  497.2867432  498.1103596  498.9336832  499.7566671  500.5792605
#>  [281]  501.4014089  502.2230538  503.0441327  503.8645793  504.6843230
#>  [286]  505.5032894  506.3213999  507.1385717  507.9547180  508.7697477
#>  [291]  509.5835656  510.3960722  511.2071638  512.0167324  512.8246659
#>  [296]  513.6308477  514.4351570  515.2374688  516.0376537  516.8355779
#>  [301]  517.6311037  518.4240886  519.2143863  520.0018458  520.7863121
#>  [306]  521.5676260  522.3456239  523.1201381  523.8909967  524.6580236
#>  [311]  525.4210387  526.1798577  526.9342922  527.6841500  528.4292347
#>  [316]  529.1693461  529.9042800  530.6338285  531.3577798  532.0759183
#>  [321]  532.7880249  533.4938769  534.1932477  534.8859077  535.5716235
#>  [326]  536.2501584  536.9212727  537.5847231  538.2402635  538.8876445
#>  [331]  539.5266138  540.1569164  540.7782943  541.3904868  541.9932307
#>  [336]  542.5862603  543.1693072  543.7421012  544.3043693  544.8558368
#>  [341]  545.3962267  545.9252603  546.4426571  546.9481348  547.4414095
#>  [346]  547.9221960  548.3902076  548.8451565  549.2867538  549.7147094
#>  [351]  550.1287327  550.5285320  550.9138152  551.2842896  551.6396623
#>  [356]  551.9796401  552.3039295  552.6122375  552.9042707  553.1797364
#>  [361]  553.4383423  553.6797963  553.9038076  554.1100856  554.2983412
#>  [366]  554.4682861  554.6196333  554.7520973  554.8653939  554.9592409
#>  [371]  555.0333574  555.0874649  555.1212867  555.1345484  555.1269780
#>  [376]  555.0983057  555.0482646  554.9765905  554.8830219  554.7673006
#>  [381]  554.6291712  554.4683819  554.2846840  554.0778327  553.8475866
#>  [386]  553.5937080  553.3159635  553.0141234  552.6879622  552.3372590
#>  [391]  551.9617968  551.5613636  551.1357518  550.6847585  550.2081859
#>  [396]  549.7058409  549.1775358  548.6230878  548.0423195  547.4350591
#>  [401]  546.8011399  546.1404011  545.4526876  544.7378499  543.9957446
#>  [406]  543.2262340  542.4291866  541.6044770  540.7519862  539.8716011
#>  [411]  538.9632152  538.0267284  537.0620471  536.0690843  535.0477595
#>  [416]  533.9979989  532.9197355  531.8129091  530.6774663  529.5133605
#>  [421]  528.3205522  527.0990086  525.8487043  524.5696205  523.2617456
#>  [426]  521.9250753  520.5596121  519.1653657  517.7423532  516.2905984
#>  [431]  514.8101326  513.3009942  511.7632287  510.1968887  508.6020341
#>  [436]  506.9787318  505.3270561  503.6470881  501.9389161  500.2026356
#>  [441]  498.4383490  496.6461658  494.8262024  492.9785822  491.1034356
#>  [446]  489.2008997  487.2711184  485.3142427  483.3304298  481.3198440
#>  [451]  479.2826560  477.2190430  475.1291887  473.0132834  470.8715233
#>  [456]  468.7041112  466.5112561  464.2931727  462.0500823  459.7822115
#>  [461]  457.4897931  455.1730657  452.8322733  450.4676655  448.0794975
#>  [466]  445.6680296  443.2335277  440.7762625  438.2965098  435.7945503
#>  [471]  433.2706697  430.7251582  428.1583104  425.5704258  422.9618077
#>  [476]  420.3327639  417.6836063  415.0146506  412.3262163  409.6186267
#>  [481]  406.8922087  404.1472924  401.3842113  398.6033022  395.8049045
#>  [486]  392.9893610  390.1570168  387.3082198  384.4433203  381.5626711
#>  [491]  378.6666267  375.7555442  372.8297821  369.8897010  366.9356628
#>  [496]  363.9680311  360.9871707  357.9934476  354.9872286  351.9688817
#>  [501]  348.9387755  345.8972791  342.8447622  339.7815946  336.7081464
#>  [506]  333.6247876  330.5318882  327.4298179  324.3189459  321.1996410
#>  [511]  318.0722710  314.9372032  311.7948038  308.6454379  305.4894693
#>  [516]  302.3272606  299.1591727  295.9855650  292.8067950  289.6232186
#>  [521]  286.4351893  283.2430586  280.0471760  276.8478881  273.6455395
#>  [526]  270.4404719  267.2330242  264.0235327  260.8123305  257.5997479
#>  [531]  254.3861116  251.1717454  247.9569695  244.7421008  241.5274524
#>  [536]  238.3133338  235.1000507  231.8879051  228.6771947  225.4682136
#>  [541]  222.2612513  219.0565935  215.8545214  212.6553118  209.4592372
#>  [546]  206.2665656  203.0775603  199.8924800  196.7115788  193.5351060
#>  [551]  190.3633059  187.1964182  184.0346777  180.8783138  177.7275514
#>  [556]  174.5826101  171.4437045  168.3110438  165.1848324  162.0652693
#>  [561]  158.9525484  155.8468581  152.7483818  149.6572976  146.5737780
#>  [566]  143.4979905  140.4300972  137.3702546  134.3186143  131.2753221
#>  [571]  128.2405188  125.2143396  122.1969146  119.1883683  116.1888201
#>  [576]  113.1983840  110.2171687  107.2452777  104.2828091  101.3298560
#>  [581]   98.3865060   95.4528419   92.5289409   89.6148756   86.7107130
#>  [586]   83.8165156   80.9323406   78.0582401   75.1942617   72.3404479
#>  [591]   69.4968364   66.6634601   63.8403474   61.0275219   58.2250026
#>  [596]   55.4328039   52.6509359   49.8794043   47.1182103   44.3673509
#>  [601]   41.6268189   38.8966029   36.1766875   33.4670533   30.7676769
#>  [606]   28.0785311   25.3995850   22.7308039   20.0721494   17.4235798
#>  [611]   14.7850498   12.1565107    9.5379106    6.9291942    4.3303033
#>  [616]    1.7411766   -0.8382502   -3.4080444   -5.9682757   -8.5190169
#>  [621]  -11.0603432  -13.5923324  -16.1150646  -18.6286223  -21.1330904
#>  [626]  -23.6285558  -26.1151075  -28.5928364  -31.0618355  -33.5221994
#>  [631]  -35.9740246  -38.4174090  -40.8524523  -43.2792553  -45.6979205
#>  [636]  -48.1085515  -50.5112531  -52.9061312  -55.2932927  -57.6728454
#>  [641]  -60.0448979  -62.4095597  -64.7669409  -67.1171519  -69.4603041
#>  [646]  -71.7965090  -74.1258784  -76.4485245  -78.7645596  -81.0740961
#>  [651]  -83.3772465  -85.6741231  -87.9648381  -90.2495036  -92.5282313
#>  [656]  -94.8011327  -97.0683186  -99.3298995 -101.5859855 -103.8366858
#>  [661] -106.0821089 -108.3223627 -110.5575544 -112.7877899 -115.0131745
#>  [666] -117.2338125 -119.4498070 -121.6612601 -123.8682726 -126.0709443
#>  [671] -128.2693736 -130.4636575 -132.6538919 -134.8401710 -137.0225878
#>  [676] -139.2012338 -141.3761987 -143.5475709 -145.7154371 -147.8798823
#>  [681] -150.0409900 -152.1988418 -154.3535176 -156.5050957 -158.6536524
#>  [686] -160.7992622 -162.9419978 -165.0819302 -167.2191282 -169.3536589
#>  [691] -171.4855874 -173.6149769 -175.7418886 -177.8663817 -179.9885136
#>  [696] -182.1083396 -184.2259129 -186.3412848 -188.4545046 -190.5656197
#>  [701] -192.6746751 -194.7817143 -196.8867785 -198.9899068 -201.0911366
#>  [706] -203.1905030 -205.2880393 -207.3837768 -209.4777447 -211.5699703
#>  [711] -213.6604791 -215.7492944 -217.8364378 -219.9219289 -222.0057853
#>  [716] -224.0880229 -226.1686556 -228.2476957 -230.3251535 -232.4010374
#>  [721] -234.4753543 -236.5481092 -238.6193054 -240.6889445 -242.7570265
#>  [726] -244.8235497 -246.8885108 -248.9519049 -251.0137256 -253.0739650
#>  [731] -255.1326137 -257.1896606 -259.2450936 -261.2988989 -263.3510615
#>  [736] -265.4015649 -267.4503916 -269.4975225 -271.5429374 -273.5866152
#>  [741] -275.6285333 -277.6686680 -279.7069948 -281.7434879 -283.7781207
#>  [746] -285.8108653 -287.8416933 -289.8705752 -291.8974805 -293.9223782
#>  [751] -295.9452363 -297.9660222 -299.9847023 -302.0012428 -304.0156089
#>  [756] -306.0277653 -308.0376762 -310.0453053 -312.0506157 -314.0535702
#>  [761] -316.0541310 -318.0522601 -320.0479191 -322.0410693 -324.0316717
#>  [766] -326.0196870 -328.0050758 -329.9877985 -331.9678155 -333.9450867
#>  [771] -335.9195724 -337.8912324 -339.8600269 -341.8259159 -343.7888594
#>  [776] -345.7488176 -347.7057508 -349.6596192 -351.6103835 -353.5580044
#>  [781] -355.5024428 -357.4436598 -359.3816168 -361.3162756 -363.2475981
#>  [786] -365.1755467 -367.1000840 -369.0211730 -370.9387772 -372.8528604
#>  [791] -374.7633868 -376.6703211 -378.5736285 -380.4732746 -382.3692254
#>  [796] -384.2614477 -386.1499084 -388.0345754 -389.9154167 -391.7924011
#>  [801] -393.6654980 -395.5346773 -397.3999093 -399.2611653 -401.1184168
#>  [806] -402.9716362 -404.8207963 -406.6658706 -408.5068333 -410.3436592
#>  [811] -412.1763235 -414.0048025 -415.8290726 -417.6491112 -419.4648962
#>  [816] -421.2764063 -423.0836206 -424.8865190 -426.6850819 -428.4792904
#>  [821] -430.2691264 -432.0545721 -433.8356106 -435.6122255 -437.3844009
#>  [826] -439.1521218 -440.9153734 -442.6741419 -444.4284138 -446.1781763
#>  [831] -447.9234171 -449.6641246 -451.4002876 -453.1318956 -454.8589384
#>  [836] -456.5814065 -458.2992909 -460.0125832 -461.7212751 -463.4253593
#>  [841] -465.1248286 -466.8196764 -468.5098966 -470.1954834 -471.8764315
#>  [846] -473.5527360 -475.2243924 -476.8913966 -478.5537449 -480.2114338
#>  [851] -481.8644604 -483.5128219 -485.1565159 -486.7955404 -488.4298937
#>  [856] -490.0595742 -491.6845807 -493.3049122 -494.9205681 -496.5315479
#>  [861] -498.1378512 -499.7394781 -501.3364287 -502.9287033 -504.5163024
#>  [866] -506.0992267 -507.6774769 -509.2510540 -510.8199591 -512.3841934
#>  [871] -513.9437580 -515.4986545 -517.0488843 -518.5944488 -520.1353497
#>  [876] -521.6715887 -523.2031675 -524.7300876 -526.2523510 -527.7699595
#>  [881] -529.2829147 -530.7912184 -532.2948726 -533.7938789 -535.2882391
#>  [886] -536.7779550 -538.2630282 -539.7434606 -541.2192536 -542.6904089
#>  [891] -544.1569280 -545.6188126 -547.0760639 -548.5286834 -549.9766725
#>  [896] -551.4200324 -552.8587643 -554.2928693 -555.7223486 -557.1472032
#>  [901] -558.5674339 -559.9830417 -561.3940275 -562.8003918 -564.2021355
#>  [906] -565.5992591 -566.9917632 -568.3796482 -569.7629148 -571.1415631
#>  [911] -572.5155936 -573.8850066 -575.2498023 -576.6099810 -577.9655427
#>  [916] -579.3164878 -580.6628162 -582.0045282 -583.3416238 -584.6741032
#>  [921] -586.0019663 -587.3252134 -588.6438446 -589.9578600 -591.2672597
#>  [926] -592.5720440 -593.8722132 -595.1677676 -596.4587074 -597.7450332
#>  [931] -599.0267455 -600.3038449 -601.5763320 -602.8442076 -604.1074728
#>  [936] -605.3661284 -606.6201757 -607.8696160 -609.1144507 -610.3546814
#>  [941] -611.5903100 -612.8213383 -614.0477686 -615.2696031 -616.4868444
#>  [946] -617.6994954 -618.9075589 -620.1110383 -621.3099369 -622.5042586
#>  [951] -623.6940074 -624.8791874 -626.0598034 -627.2358600 -628.4073625
#>  [956] -629.5743164 -630.7367273 -631.8946015 -633.0479454 -634.1967657
#>  [961] -635.3410697 -636.4808648 -637.6161588 -638.7469602 -639.8732774
#>  [966] -640.9951196 -642.1124962 -643.2254169 -644.3338921 -645.4379325
#>  [971] -646.5375491 -647.6327535 -648.7235576 -649.8099738 -650.8920150
#>  [976] -651.9696945 -653.0430261 -654.1120239 -655.1767027 -656.2370777
#>  [981] -657.2931643 -658.3449788 -659.3925377 -660.4358581 -661.4749574
#>  [986] -662.5098537 -663.5405655 -664.5671118 -665.5895119 -666.6077859
#>  [991] -667.6219541 -668.6320375 -669.6380574 -670.6400356 -671.6379946
#>  [996] -672.6319570 -673.6219462 -674.6079859 -675.5901003 -676.5683140
#> 
#> $baseline_pupil_raw_deblink_detransient_interpolate_lpfilt_sub_bline_epoch_prePostProbe$block_1$baseline_cor_epochs[[3]]
#>    [1] 454.4055495 455.1658155 455.9290346 456.6952749 457.4646025 458.2370804
#>    [7] 459.0127697 459.7917284 460.5740122 461.3596743 462.1487650 462.9413324
#>   [13] 463.7374214 464.5370749 465.3403327 466.1472320 466.9578076 467.7720913
#>   [19] 468.5901125 469.4118978 470.2374712 471.0668539 471.9000646 472.7371193
#>   [25] 473.5780314 474.4228116 475.2714681 476.1240063 476.9804292 477.8407371
#>   [31] 478.7049279 479.5729968 480.4449366 481.3207377 482.2003878 483.0838724
#>   [37] 483.9711745 484.8622746 485.7571512 486.6557802 487.5581352 488.4641878
#>   [43] 489.3739073 490.2872608 491.2042132 492.1247276 493.0487647 493.9762834
#>   [49] 494.9072408 495.8415918 496.7792896 497.7202857 498.6645295 499.6119691
#>   [55] 500.5625507 501.5162190 502.4729171 503.4325865 504.3951676 505.3605990
#>   [61] 506.3288183 507.2997616 508.2733640 509.2495594 510.2282803 511.2094587
#>   [67] 512.1930251 513.1789096 514.1670410 515.1573476 516.1497569 517.1441956
#>   [73] 518.1405901 519.1388660 520.1389485 521.1407625 522.1442324 523.1492824
#>   [79] 524.1558365 525.1638184 526.1731520 527.1837609 528.1955689 529.2084998
#>   [85] 530.2224776 531.2374265 532.2532711 533.2699362 534.2873470 535.3054294
#>   [91] 536.3241096 537.3433145 538.3629715 539.3830090 540.4033560 541.4239421
#>   [97] 542.4446983 543.4655560 544.4864480 545.5073079 546.5280704 547.5486716
#>  [103] 548.5690486 549.5891397 550.6088847 551.6282246 552.6471017 553.6654601
#>  [109] 554.6832451 555.7004035 556.7168839 557.7326363 558.7476125 559.7617658
#>  [115] 560.7750516 561.7874266 562.7988496 563.8092812 564.8186837 565.8270214
#>  [121] 566.8342607 567.8403695 568.8453182 569.8490787 570.8516252 571.8529339
#>  [127] 572.8529830 573.8517528 574.8492257 575.8453861 576.8402205 577.8337178
#>  [133] 578.8258687 579.8166661 580.8061052 581.7941830 582.7808991 583.7662549
#>  [139] 584.7502539 585.7329021 586.7142071 587.6941791 588.6728301 589.6501743
#>  [145] 590.6262279 591.6010094 592.5745389 593.5468390 594.5179341 595.4878504
#>  [151] 596.4566164 597.4242622 598.3908201 599.3563240 600.3208099 601.2843153
#>  [157] 602.2468798 603.2085445 604.1693522 605.1293475 606.0885765 607.0470868
#>  [163] 608.0049277 608.9621498 609.9188052 610.8749474 611.8306312 612.7859126
#>  [169] 613.7408489 614.6954985 615.6499209 616.6041767 617.5583274 618.5124355
#>  [175] 619.4665643 620.4207778 621.3751409 622.3297190 623.2845782 624.2397850
#>  [181] 625.1954065 626.1515100 627.1081633 628.0654342 629.0233909 629.9821015
#>  [187] 630.9416341 631.9020569 632.8634378 633.8258445 634.7893443 635.7540044
#>  [193] 636.7198913 637.6870710 638.6556088 639.6255695 640.5970169 641.5700140
#>  [199] 642.5446229 643.5209046 644.4989189 645.4787246 646.4603792 647.4439385
#>  [205] 648.4294573 649.4169886 650.4065839 651.3982928 652.3921634 653.3882418
#>  [211] 654.3865722 655.3871968 656.3901555 657.3954863 658.4032249 659.4134044
#>  [217] 660.4260558 661.4412075 662.4588853 663.4791124 664.5019092 665.5272935
#>  [223] 666.5552800 667.5858808 668.6191047 669.6549575 670.6934420 671.7345576
#>  [229] 672.7783007 673.8246641 674.8736375 675.9252069 676.9793549 678.0360605
#>  [235] 679.0952992 680.1570428 681.2212592 682.2879128 683.3569640 684.4283694
#>  [241] 685.5020816 686.5780495 687.6562178 688.7365271 689.8189142 690.9033116
#>  [247] 691.9896477 693.0778469 694.1678292 695.2595105 696.3528024 697.4476124
#>  [253] 698.5438436 699.6413948 700.7401605 701.8400310 702.9408922 704.0426256
#>  [259] 705.1451085 706.2482139 707.3518102 708.4557617 709.5599284 710.6641659
#>  [265] 711.7683255 712.8722541 713.9757947 715.0787856 716.1810611 717.2824513
#>  [271] 718.3827820 719.4818750 720.5795479 721.6756141 722.7698832 723.8621605
#>  [277] 724.9522475 726.0399418 727.1250370 728.2073230 729.2865858 730.3626076
#>  [283] 731.4351673 732.5040398 733.5689965 734.6298055 735.6862315 736.7380354
#>  [289] 737.7849755 738.8268062 739.8632794 740.8941434 741.9191438 742.9380234
#>  [295] 743.9505219 744.9563764 745.9553214 746.9470889 747.9314083 748.9080066
#>  [301] 749.8766088 750.8369373 751.7887129 752.7316540 753.6654774 754.5898980
#>  [307] 755.5046291 756.4093823 757.3038680 758.1877950 759.0608710 759.9228026
#>  [313] 760.7732954 761.6120539 762.4387821 763.2531831 764.0549597 764.8438141
#>  [319] 765.6194483 766.3815640 767.1298629 767.8640467 768.5838175 769.2888773
#>  [325] 769.9789290 770.6536756 771.3128212 771.9560702 772.5831285 773.1937026
#>  [331] 773.7875003 774.3642307 774.9236045 775.4653336 775.9891319 776.4947148
#>  [337] 776.9817999 777.4501067 777.8993569 778.3292744 778.7395856 779.1300194
#>  [343] 779.5003075 779.8501841 780.1793864 780.4876549 780.7747327 781.0403666
#>  [349] 781.2843066 781.5063060 781.7061221 781.8835155 782.0382507 782.1700964
#>  [355] 782.2788251 782.3642133 782.4260420 782.4640965 782.4781664 782.4680460
#>  [361] 782.4335341 782.3744345 782.2905555 782.1817106 782.0477181 781.8884016
#>  [367] 781.7035898 781.4931166 781.2568215 780.9945492 780.7061501 780.3914800
#>  [373] 780.0504005 779.6827789 779.2884884 778.8674079 778.4194224 777.9444229
#>  [379] 777.4423062 776.9129756 776.3563403 775.7723158 775.1608239 774.5217927
#>  [385] 773.8551565 773.1608563 772.4388392 771.6890591 770.9114761 770.1060571
#>  [391] 769.2727754 768.4116108 767.5225500 766.6055860 765.6607186 764.6879543
#>  [397] 763.6873060 762.6587936 761.6024436 760.5182888 759.4063692 758.2667311
#>  [403] 757.0994277 755.9045185 754.6820701 753.4321552 752.1548537 750.8502514
#>  [409] 749.5184413 748.1595224 746.7736005 745.3607878 743.9212029 742.4549708
#>  [415] 740.9622228 739.4430966 737.8977360 736.3262913 734.7289187 733.1057805
#>  [421] 731.4570452 729.7828872 728.0834869 726.3590304 724.6097098 722.8357229
#>  [427] 721.0372730 719.2145691 717.3678258 715.4972629 713.6031057 711.6855849
#>  [433] 709.7449361 707.7814003 705.7952232 703.7866557 701.7559535 699.7033768
#>  [439] 697.6291908 695.5336649 693.4170732 691.2796941 689.1218102 686.9437083
#>  [445] 684.7456791 682.5280174 680.2910218 678.0349946 675.7602416 673.4670723
#>  [451] 671.1557995 668.8267392 666.4802106 664.1165360 661.7360406 659.3390524
#>  [457] 656.9259021 654.4969229 652.0524507 649.5928234 647.1183814 644.6294671
#>  [463] 642.1264247 639.6096006 637.0793427 634.5360005 631.9799252 629.4114691
#>  [469] 626.8309860 624.2388306 621.6353588 619.0209272 616.3958933 613.7606153
#>  [475] 611.1154517 608.4607616 605.7969044 603.1242393 600.4431261 597.7539241
#>  [481] 595.0569926 592.3526906 589.6413765 586.9234084 584.1991436 581.4689387
#>  [487] 578.7331493 575.9921302 573.2462351 570.4958162 567.7412248 564.9828104
#>  [493] 562.2209213 559.4559040 556.6881031 553.9178619 551.1455211 548.3714199
#>  [499] 545.5958951 542.8192815 540.0419112 537.2641143 534.4862182 531.7085479
#>  [505] 528.9314253 526.1551702 523.3800989 520.6065252 517.8347599 515.0651104
#>  [511] 512.2978813 509.5333739 506.7718860 504.0137123 501.2591440 498.5084686
#>  [517] 495.7619703 493.0199295 490.2826231 487.5503241 484.8233018 482.1018215
#>  [523] 479.3861449 476.6765295 473.9732288 471.2764925 468.5865659 465.9036905
#>  [529] 463.2281033 460.5600375 457.8997217 455.2473804 452.6032339 449.9674981
#>  [535] 447.3403844 444.7221001 442.1128480 439.5128264 436.9222292 434.3412461
#>  [541] 431.7700620 429.2088576 426.6578090 424.1170877 421.5868611 419.0672917
#>  [547] 416.5585376 414.0607527 411.5740861 409.0986825 406.6346821 404.1822208
#>  [553] 401.7414298 399.3124360 396.8953618 394.4903254 392.0974402 389.7168156
#>  [559] 387.3485563 384.9927631 382.6495320 380.3189550 378.0011198 375.6961098
#>  [565] 373.4040043 371.1248783 368.8588027 366.6058444 364.3660660 362.1395262
#>  [571] 359.9262798 357.7263775 355.5398660 353.3667883 351.2071835 349.0610869
#>  [577] 346.9285300 344.8095406 342.7041430 340.6123576 338.5342015 336.4696881
#>  [583] 334.4188275 332.3816262 330.3580874 328.3482111 326.3519939 324.3694292
#>  [589] 322.4005073 320.4452154 318.5035375 316.5754549 314.6609456 312.7599850
#>  [595] 310.8725455 308.9985969 307.1381061 305.2910375 303.4573527 301.6370109
#>  [601] 299.8299689 298.0361807 296.2555984 294.4881714 292.7338471 290.9925706
#>  [607] 289.2642847 287.5489303 285.8464463 284.1567694 282.4798346 280.8155749
#>  [613] 279.1639215 277.5248040 275.8981501 274.2838859 272.6819360 271.0922233
#>  [619] 269.5146695 267.9491946 266.3957173 264.8541550 263.3244238 261.8064386
#>  [625] 260.3001131 258.8053600 257.3220907 255.8502158 254.3896447 252.9402861
#>  [631] 251.5020476 250.0748362 248.6585579 247.2531182 245.8584215 244.4743719
#>  [637] 243.1008728 241.7378269 240.3851365 239.0427034 237.7104289 236.3882138
#>  [643] 235.0759588 233.7735640 232.4809292 231.1979541 229.9245381 228.6605804
#>  [649] 227.4059800 226.1606357 224.9244465 223.6973109 222.4791277 221.2697955
#>  [655] 220.0692132 218.8772793 217.6938927 216.5189524 215.3523573 214.1940067
#>  [661] 213.0437999 211.9016364 210.7674162 209.6410391 208.5224055 207.4114159
#>  [667] 206.3079712 205.2119725 204.1233215 203.0419199 201.9676700 200.9004745
#>  [673] 199.8402364 198.7868590 197.7402464 196.7003028 195.6669330 194.6400423
#>  [679] 193.6195364 192.6053215 191.5973043 190.5953921 189.5994926 188.6095141
#>  [685] 187.6253654 186.6469559 185.6741954 184.7069945 183.7452641 182.7889159
#>  [691] 181.8378620 180.8920153 179.9512889 179.0155969 178.0848538 177.1589746
#>  [697] 176.2378751 175.3214717 174.4096811 173.5024209 172.5996093 171.7011649
#>  [703] 170.8070071 169.9170559 169.0312317 168.1494558 167.2716500 166.3977366
#>  [709] 165.5276386 164.6612796 163.7985839 162.9394762 162.0838820 161.2317274
#>  [715] 160.3829390 159.5374440 158.6951702 157.8560462 157.0200010 156.1869642
#>  [721] 155.3568661 154.5296376 153.7052100 152.8835154 152.0644865 151.2480564
#>  [727] 150.4341589 149.6227285 148.8137000 148.0070091 147.2025919 146.4003851
#>  [733] 145.6003259 144.8023523 144.0064027 143.2124161 142.4203321 141.6300909
#>  [739] 140.8416332 140.0549003 139.2698340 138.4863768 137.7044718 136.9240625
#>  [745] 136.1450929 135.3675079 134.5912527 133.8162732 133.0425157 132.2699272
#>  [751] 131.4984552 130.7280479 129.9586539 129.1902225 128.4227033 127.6560469
#>  [757] 126.8902041 126.1251264 125.3607660 124.5970754 123.8340079 123.0715173
#>  [763] 122.3095579 121.5480846 120.7870531 120.0264194 119.2661401 118.5061726
#>  [769] 117.7464747 116.9870049 116.2277220 115.4685859 114.7095566 113.9505950
#>  [775] 113.1916624 112.4327209 111.6737330 110.9146620 110.1554716 109.3961263
#>  [781] 108.6365910 107.8768314 107.1168138 106.3565048 105.5958722 104.8348838
#>  [787] 104.0735084 103.3117153 102.5494746 101.7867566 101.0235328 100.2597747
#>  [793]  99.4954550  98.7305467  97.9650235  97.1988597  96.4320303  95.6645110
#>  [799]  94.8962780  94.1273081  93.3575789  92.5870685  91.8157556  91.0436198
#>  [805]  90.2706410  89.4968000  88.7220780  87.9464571  87.1699196  86.3924490
#>  [811]  85.6140290  84.8346440  84.0542792  83.2729202  82.4905534  81.7071656
#>  [817]  80.9227445  80.1372782  79.3507554  78.5631655  77.7744985  76.9847448
#>  [823]  76.1938958  75.4019429  74.6088787  73.8146958  73.0193878  72.2229487
#>  [829]  71.4253730  70.6266558  69.8267928  69.0257801  68.2236144  67.4202929
#>  [835]  66.6158135  65.8101742  65.0033739  64.1954117  63.3862874  62.5760011
#>  [841]  61.7645535  60.9519455  60.1381787  59.3232550  58.5071768  57.6899468
#>  [847]  56.8715682  56.0520445  55.2313796  54.4095779  53.5866438  52.7625823
#>  [853]  51.9373989  51.1110989  50.2836884  49.4551735  48.6255607  47.7948567
#>  [859]  46.9630684  46.1302031  45.2962682  44.4612712  43.6252201  42.7881228
#>  [865]  41.9499875  41.1108225  40.2706362  39.4294373  38.5872345  37.7440364
#>  [871]  36.8998520  36.0546902  35.2085600  34.3614703  33.5134303  32.6644489
#>  [877]  31.8145353  30.9636984  30.1119472  29.2592906  28.4057376  27.5512968
#>  [883]  26.6959771  25.8397870  24.9827350  24.1248294  23.2660785  22.4064903
#>  [889]  21.5460726  20.6848332  19.8227796  18.9599190  18.0962585  17.2318049
#>  [895]  16.3665649  15.5005447  14.6337504  13.7661878  12.8978624  12.0287794
#>  [901]  11.1589437  10.2883598   9.4170319   8.5449640   7.6721597   6.7986221
#>  [907]   5.9243540   5.0493579   4.1736360   3.2971899   2.4200209   1.5421299
#>  [913]   0.6635175  -0.2158162  -1.0958716  -1.9766493  -2.8581506  -3.7403769
#>  [919]  -4.6233303  -5.5070133  -6.3914286  -7.2765795  -8.1624699  -9.0491038
#>  [925]  -9.9364859 -10.8246212 -11.7135151 -12.6031737 -13.4936031 -14.3848103
#>  [931] -15.2768024 -16.1695870 -17.0631722 -17.9575665 -18.8527787 -19.7488181
#>  [937] -20.6456945 -21.5434179 -22.4419988 -23.3414481 -24.2417771 -25.1429973
#>  [943] -26.0451208 -26.9481599 -27.8521273 -28.7570359 -29.6628993 -30.5697309
#>  [949] -31.4775449 -32.3863554 -33.2961770 -34.2070245 -35.1189131 -36.0318580
#>  [955] -36.9458748 -37.8609792 -38.7771874 -39.6945154 -40.6129796 -41.5325966
#>  [961] -42.4533829 -43.3753556 -44.2985314 -45.2229273 -46.1485607 -47.0754485
#>  [967] -48.0036081 -48.9330567 -49.8638117 -50.7958903 -51.7293099 -52.6640877
#>  [973] -53.6002409 -54.5377868 -55.4767422 -56.4171243 -57.3589498 -58.3022354
#>  [979] -59.2469978 -60.1932531 -61.1410177 -62.0903074 -63.0411380 -63.9935249
#>  [985] -64.9474833 -65.9030282 -66.8601741 -67.8189353 -68.7793257 -69.7413589
#>  [991] -70.7050480 -71.6704058 -72.6374446 -73.6061764 -74.5766126 -75.5487641
#>  [997] -76.5226415 -77.4982546 -78.4756130 -79.4547255
#> 
#> $baseline_pupil_raw_deblink_detransient_interpolate_lpfilt_sub_bline_epoch_prePostProbe$block_1$baseline_cor_epochs[[4]]
#>    [1] -348.7060 -349.0138 -349.3177 -349.6179 -349.9142 -350.2066 -350.4951
#>    [8] -350.7797 -351.0604 -351.3372 -351.6101 -351.8789 -352.1439 -352.4048
#>   [15] -352.6618 -352.9148 -353.1637 -353.4087 -353.6496 -353.8866 -354.1195
#>   [22] -354.3483 -354.5732 -354.7940 -355.0108 -355.2235 -355.4322 -355.6369
#>   [29] -355.8375 -356.0341 -356.2267 -356.4153 -356.5999 -356.7805 -356.9570
#>   [36] -357.1296 -357.2983 -357.4629 -357.6236 -357.7804 -357.9333 -358.0822
#>   [43] -358.2273 -358.3685 -358.5059 -358.6394 -358.7691 -358.8951 -359.0172
#>   [50] -359.1357 -359.2504 -359.3614 -359.4688 -359.5725 -359.6726 -359.7692
#>   [57] -359.8622 -359.9517 -360.0377 -360.1202 -360.1994 -360.2751 -360.3476
#>   [64] -360.4167 -360.4825 -360.5451 -360.6046 -360.6608 -360.7140 -360.7641
#>   [71] -360.8112 -360.8553 -360.8964 -360.9347 -360.9701 -361.0027 -361.0325
#>   [78] -361.0597 -361.0841 -361.1060 -361.1253 -361.1421 -361.1564 -361.1683
#>   [85] -361.1778 -361.1851 -361.1900 -361.1928 -361.1934 -361.1919 -361.1883
#>   [92] -361.1828 -361.1753 -361.1659 -361.1547 -361.1418 -361.1270 -361.1107
#>   [99] -361.0927 -361.0731 -361.0521 -361.0296 -361.0057 -360.9805 -360.9540
#>  [106] -360.9263 -360.8974 -360.8673 -360.8363 -360.8042 -360.7712 -360.7373
#>  [113] -360.7025 -360.6670 -360.6307 -360.5938 -360.5562 -360.5181 -360.4795
#>  [120] -360.4404 -360.4009 -360.3610 -360.3208 -360.2804 -360.2397 -360.1989
#>  [127] -360.1580 -360.1171 -360.0761 -360.0352 -359.9943 -359.9536 -359.9131
#>  [134] -359.8728 -359.8327 -359.7930 -359.7536 -359.7146 -359.6760 -359.6379
#>  [141] -359.6004 -359.5633 -359.5269 -359.4911 -359.4560 -359.4215 -359.3878
#>  [148] -359.3549 -359.3228 -359.2914 -359.2610 -359.2314 -359.2028 -359.1750
#>  [155] -359.1483 -359.1225 -359.0978 -359.0741 -359.0514 -359.0298 -359.0093
#>  [162] -358.9900 -358.9717 -358.9546 -358.9387 -358.9239 -358.9103 -358.8979
#>  [169] -358.8867 -358.8767 -358.8680 -358.8604 -358.8541 -358.8490 -358.8451
#>  [176] -358.8424 -358.8410 -358.8408 -358.8418 -358.8440 -358.8475 -358.8521
#>  [183] -358.8579 -358.8649 -358.8731 -358.8824 -358.8929 -358.9045 -358.9172
#>  [190] -358.9310 -358.9459 -358.9618 -358.9788 -358.9967 -359.0156 -359.0355
#>  [197] -359.0564 -359.0781 -359.1007 -359.1241 -359.1484 -359.1734 -359.1992
#>  [204] -359.2257 -359.2529 -359.2807 -359.3091 -359.3381 -359.3676 -359.3976
#>  [211] -359.4281 -359.4589 -359.4901 -359.5216 -359.5533 -359.5853 -359.6175
#>  [218] -359.6498 -359.6822 -359.7146 -359.7469 -359.7792 -359.8114 -359.8435
#>  [225] -359.8752 -359.9068 -359.9379 -359.9687 -359.9991 -360.0290 -360.0583
#>  [232] -360.0870 -360.1150 -360.1424 -360.1689 -360.1947 -360.2195 -360.2435
#>  [239] -360.2664 -360.2882 -360.3090 -360.3286 -360.3469 -360.3640 -360.3798
#>  [246] -360.3941 -360.4071 -360.4185 -360.4283 -360.4365 -360.4431 -360.4479
#>  [253] -360.4510 -360.4522 -360.4516 -360.4490 -360.4444 -360.4378 -360.4291
#>  [260] -360.4183 -360.4053 -360.3900 -360.3725 -360.3526 -360.3304 -360.3058
#>  [267] -360.2787 -360.2491 -360.2169 -360.1822 -360.1449 -360.1049 -360.0622
#>  [274] -360.0168 -359.9686 -359.9176 -359.8639 -359.8072 -359.7477 -359.6853
#>  [281] -359.6199 -359.5516 -359.4804 -359.4061 -359.3288 -359.2485 -359.1651
#>  [288] -359.0787 -358.9893 -358.8967 -358.8011 -358.7023 -358.6005 -358.4956
#>  [295] -358.3876 -358.2765 -358.1623 -358.0450 -357.9247 -357.8013 -357.6748
#>  [302] -357.5453 -357.4127 -357.2772 -357.1387 -356.9972 -356.8528 -356.7054
#>  [309] -356.5552 -356.4021 -356.2462 -356.0876 -355.9261 -355.7620 -355.5952
#>  [316] -355.4258 -355.2538 -355.0793 -354.9024 -354.7230 -354.5412 -354.3571
#>  [323] -354.1707 -353.9822 -353.7916 -353.5988 -353.4041 -353.2075 -353.0090
#>  [330] -352.8087 -352.6067 -352.4031 -352.1979 -351.9913 -351.7833 -351.5740
#>  [337] -351.3634 -351.1518 -350.9391 -350.7255 -350.5110 -350.2958 -350.0799
#>  [344] -349.8635 -349.6467 -349.4295 -349.2120 -348.9944 -348.7768 -348.5593
#>  [351] -348.3420 -348.1249 -347.9083 -347.6922 -347.4768 -347.2621 -347.0484
#>  [358] -346.8356 -346.6239 -346.4135 -346.2045 -345.9969 -345.7910 -345.5868
#>  [365] -345.3845 -345.1841 -344.9859 -344.7900 -344.5964 -344.4054 -344.2169
#>  [372] -344.0313 -343.8486 -343.6688 -343.4923 -343.3191 -343.1493 -342.9830
#>  [379] -342.8205 -342.6617 -342.5070 -342.3563 -342.2099 -342.0678 -341.9302
#>  [386] -341.7972 -341.6690 -341.5457 -341.4274 -341.3143 -341.2064 -341.1039
#>  [393] -341.0070 -340.9157 -340.8303 -340.7507 -340.6772 -340.6098 -340.5488
#>  [400] -340.4942 -340.4461 -340.4046 -340.3700 -340.3422 -340.3214 -340.3078
#>  [407] -340.3014 -340.3024 -340.3109 -340.3269 -340.3506 -340.3822 -340.4216
#>  [414] -340.4690 -340.5246 -340.5883 -340.6604 -340.7409 -340.8299 -340.9275
#>  [421] -341.0337 -341.1488 -341.2727 -341.4056 -341.5475 -341.6986 -341.8588
#>  [428] -342.0283 -342.2072 -342.3955 -342.5933 -342.8007 -343.0177 -343.2445
#>  [435] -343.4810 -343.7273 -343.9835 -344.2496 -344.5258 -344.8119 -345.1082
#>  [442] -345.4146 -345.7312 -346.0580 -346.3951 -346.7425 -347.1002 -347.4683
#>  [449] -347.8468 -348.2356 -348.6350 -349.0448 -349.4651 -349.8959 -350.3372
#>  [456] -350.7890 -351.2514 -351.7243 -352.2077 -352.7017 -353.2063 -353.7214
#>  [463] -354.2470 -354.7832 -355.3298 -355.8870 -356.4547 -357.0328 -357.6214
#>  [470] -358.2204 -358.8298 -359.4495 -360.0796 -360.7200 -361.3707 -362.0316
#>  [477] -362.7027 -363.3839 -364.0753 -364.7767 -365.4881 -366.2094 -366.9406
#>  [484] -367.6817 -368.4326 -369.1932 -369.9634 -370.7433 -371.5326 -372.3315
#>  [491] -373.1397 -373.9572 -374.7839 -375.6199 -376.4648 -377.3188 -378.1817
#>  [498] -379.0534 -379.9339 -380.8230 -381.7207 -382.6268 -383.5413 -384.4641
#>  [505] -385.3950 -386.3341 -387.2811 -388.2360 -389.1986 -390.1689 -391.1468
#>  [512] -392.1321 -393.1248 -394.1246 -395.1316 -396.1456 -397.1664 -398.1941
#>  [519] -399.2283 -400.2691 -401.3163 -402.3698 -403.4294 -404.4951 -405.5667
#>  [526] -406.6440 -407.7271 -408.8156 -409.9096 -411.0088 -412.1131 -413.2225
#>  [533] -414.3367 -415.4557 -416.5793 -417.7074 -418.8398 -419.9764 -421.1171
#>  [540] -422.2617 -423.4101 -424.5621 -425.7177 -426.8767 -428.0389 -429.2042
#>  [547] -430.3725 -431.5436 -432.7174 -433.8937 -435.0725 -436.2535 -437.4367
#>  [554] -438.6218 -439.8088 -440.9975 -442.1878 -443.3795 -444.5725 -445.7666
#>  [561] -446.9618 -448.1578 -449.3546 -450.5520 -451.7498 -452.9480 -454.1463
#>  [568] -455.3447 -456.5430 -457.7411 -458.9389 -460.1361 -461.3327 -462.5286
#>  [575] -463.7236 -464.9176 -466.1104 -467.3019 -468.4921 -469.6806 -470.8676
#>  [582] -472.0527 -473.2359 -474.4171 -475.5961 -476.7729 -477.9472 -479.1190
#>  [589] -480.2881 -481.4545 -482.6180 -483.7785 -484.9358 -486.0900 -487.2408
#>  [596] -488.3881 -489.5319 -490.6720 -491.8083 -492.9407 -494.0692 -495.1935
#>  [603] -496.3137 -497.4296 -498.5410 -499.6480 -500.7504 -501.8481 -502.9410
#>  [610] -504.0290 -505.1121 -506.1902 -507.2631 -508.3308 -509.3932 -510.4502
#>  [617] -511.5017 -512.5477 -513.5881 -514.6228 -515.6517 -516.6747 -517.6919
#>  [624] -518.7031 -519.7082 -520.7072 -521.7000 -522.6866 -523.6669 -524.6409
#>  [631] -525.6084 -526.5694 -527.5240 -528.4719 -529.4133 -530.3479 -531.2759
#>  [638] -532.1971 -533.1115 -534.0190 -534.9197 -535.8135 -536.7003 -537.5801
#>  [645] -538.4529 -539.3186 -540.1773 -541.0289 -541.8733 -542.7106 -543.5407
#>  [652] -544.3636 -545.1793 -545.9878 -546.7890 -547.5830 -548.3697 -549.1491
#>  [659] -549.9213 -550.6861 -551.4437 -552.1939 -552.9369 -553.6725 -554.4009
#>  [666] -555.1219 -555.8357 -556.5422 -557.2414 -557.9333 -558.6179 -559.2953
#>  [673] -559.9655 -560.6284 -561.2842 -561.9327 -562.5740 -563.2082 -563.8353
#>  [680] -564.4553 -565.0681 -565.6739 -566.2727 -566.8644 -567.4491 -568.0269
#>  [687] -568.5978 -569.1617 -569.7188 -570.2691 -570.8125 -571.3492 -571.8791
#>  [694] -572.4024 -572.9190 -573.4289 -573.9323 -574.4291 -574.9194 -575.4033
#>  [701] -575.8807 -576.3517 -576.8164 -577.2748 -577.7270 -578.1729 -578.6126
#>  [708] -579.0462 -579.4738 -579.8953 -580.3108 -580.7203 -581.1240 -581.5218
#>  [715] -581.9138 -582.3001 -582.6806 -583.0555 -583.4247 -583.7884 -584.1465
#>  [722] -584.4992 -584.8464 -585.1883 -585.5248 -585.8560 -586.1820 -586.5028
#>  [729] -586.8184 -587.1289 -587.4344 -587.7349 -588.0303 -588.3209 -588.6066
#>  [736] -588.8875 -589.1635 -589.4349 -589.7015 -589.9635 -590.2208 -590.4736
#>  [743] -590.7219 -590.9656 -591.2050 -591.4399 -591.6704 -591.8966 -592.1185
#>  [750] -592.3362 -592.5496 -592.7589 -592.9640 -593.1650 -593.3620 -593.5549
#>  [757] -593.7438 -593.9287 -594.1097 -594.2868 -594.4599 -594.6293 -594.7948
#>  [764] -594.9566 -595.1145 -595.2688 -595.4193 -595.5661 -595.7093 -595.8489
#>  [771] -595.9848 -596.1172 -596.2459 -596.3712 -596.4929 -596.6111 -596.7258
#>  [778] -596.8371 -596.9449 -597.0493 -597.1503 -597.2479 -597.3420 -597.4329
#>  [785] -597.5203 -597.6045 -597.6852 -597.7627 -597.8369 -597.9078 -597.9754
#>  [792] -598.0397 -598.1007 -598.1585 -598.2130 -598.2643 -598.3124 -598.3572
#>  [799] -598.3988 -598.4372 -598.4723 -598.5043 -598.5331 -598.5586 -598.5810
#>  [806] -598.6001 -598.6161 -598.6289 -598.6384 -598.6448 -598.6481 -598.6481
#>  [813] -598.6449 -598.6386 -598.6291 -598.6164 -598.6005 -598.5814 -598.5592
#>  [820] -598.5338 -598.5052 -598.4734 -598.4384 -598.4002 -598.3589 -598.3144
#>  [827] -598.2667 -598.2158 -598.1617 -598.1045 -598.0440 -597.9804 -597.9136
#>  [834] -597.8436 -597.7704 -597.6941 -597.6145 -597.5318 -597.4459 -597.3568
#>  [841] -597.2646 -597.1692 -597.0706 -596.9688 -596.8639 -596.7558 -596.6445
#>  [848] -596.5301 -596.4125 -596.2918 -596.1680 -596.0410 -595.9109 -595.7776
#>  [855] -595.6413 -595.5018 -595.3593 -595.2136 -595.0648 -594.9130 -594.7581
#>  [862] -594.6002 -594.4392 -594.2751 -594.1081 -593.9380 -593.7649 -593.5888
#>  [869] -593.4098 -593.2278 -593.0428 -592.8549 -592.6641 -592.4703 -592.2737
#>  [876] -592.0742 -591.8719 -591.6667 -591.4586 -591.2478 -591.0342 -590.8178
#>  [883] -590.5987 -590.3768 -590.1523 -589.9250 -589.6951 -589.4625 -589.2273
#>  [890] -588.9895 -588.7491 -588.5062 -588.2607 -588.0127 -587.7623 -587.5093
#>  [897] -587.2539 -586.9961 -586.7359 -586.4734 -586.2084 -585.9412 -585.6717
#>  [904] -585.3999 -585.1259 -584.8497 -584.5713 -584.2907 -584.0080 -583.7231
#>  [911] -583.4362 -583.1473 -582.8563 -582.5633 -582.2683 -581.9714 -581.6726
#>  [918] -581.3719 -581.0693 -580.7649 -580.4586 -580.1506 -579.8408 -579.5293
#>  [925] -579.2161 -578.9012 -578.5846 -578.2664 -577.9466 -577.6253 -577.3023
#>  [932] -576.9779 -576.6519 -576.3245 -575.9956 -575.6653 -575.3336 -575.0005
#>  [939] -574.6660 -574.3302 -573.9930 -573.6546 -573.3149 -572.9740 -572.6318
#>  [946] -572.2884 -571.9438 -571.5980 -571.2511 -570.9031 -570.5539 -570.2036
#>  [953] -569.8522 -569.4998 -569.1463 -568.7918 -568.4363 -568.0797 -567.7221
#>  [960] -567.3636 -567.0041 -566.6436 -566.2822 -565.9198 -565.5566 -565.1924
#>  [967] -564.8272 -564.4612 -564.0943 -563.7265 -563.3578 -562.9882 -562.6177
#>  [974] -562.2464 -561.8742 -561.5012 -561.1272 -560.7525 -560.3768 -560.0003
#>  [981] -559.6229 -559.2447 -558.8656 -558.4856 -558.1047 -557.7230 -557.3404
#>  [988] -556.9569 -556.5725 -556.1871 -555.8009 -555.4137 -555.0257 -554.6366
#>  [995] -554.2466 -553.8557 -553.4638 -553.0709 -552.6769 -552.2820
#> 
#> $baseline_pupil_raw_deblink_detransient_interpolate_lpfilt_sub_bline_epoch_prePostProbe$block_1$baseline_cor_epochs[[5]]
#>    [1]   65.5639649   65.5089311   65.4597465   65.4163732   65.3787713
#>    [6]   65.3468984   65.3207103   65.3001604   65.2852002   65.2757790
#>   [11]   65.2718440   65.2733404   65.2802114   65.2923981   65.3098396
#>   [16]   65.3324731   65.3602337   65.3930549   65.4308678   65.4736020
#>   [21]   65.5211851   65.5735429   65.6305993   65.6922766   65.7584951
#>   [26]   65.8291737   65.9042293   65.9835773   66.0671314   66.1548038
#>   [31]   66.2465050   66.3421441   66.4416287   66.5448646   66.6517567
#>   [36]   66.7622081   66.8761208   66.9933952   67.1139307   67.2376253
#>   [41]   67.3643759   67.4940780   67.6266263   67.7619141   67.8998340
#>   [46]   68.0402772   68.1831343   68.3282947   68.4756472   68.6250796
#>   [51]   68.7764789   68.9297314   69.0847227   69.2413378   69.3994611
#>   [56]   69.5589764   69.7197670   69.8817157   70.0447050   70.2086168
#>   [61]   70.3733331   70.5387352   70.7047044   70.8711219   71.0378685
#>   [66]   71.2048253   71.3718730   71.5388927   71.7057652   71.8723718
#>   [71]   72.0385937   72.2043125   72.3694099   72.5337683   72.6972700
#>   [76]   72.8597981   73.0212360   73.1814677   73.3403778   73.4978515
#>   [81]   73.6537747   73.8080340   73.9605168   74.1111115   74.2597072
#>   [86]   74.4061938   74.5504626   74.6924055   74.8319157   74.9688877
#>   [91]   75.1032167   75.2347996   75.3635344   75.4893202   75.6120577
#>   [96]   75.7316491   75.8479978   75.9610089   76.0705889   76.1766459
#>  [101]   76.2790897   76.3778318   76.4727853   76.5638652   76.6509880
#>  [106]   76.7340724   76.8130387   76.8878093   76.9583083   77.0244621
#>  [111]   77.0861989   77.1434490   77.1961447   77.2442207   77.2876134
#>  [116]   77.3262619   77.3601070   77.3890922   77.4131629   77.4322670
#>  [121]   77.4463546   77.4553784   77.4592931   77.4580560   77.4516268
#>  [126]   77.4399676   77.4230430   77.4008201   77.3732682   77.3403596
#>  [131]   77.3020687   77.2583725   77.2092508   77.1546857   77.0946619
#>  [136]   77.0291667   76.9581900   76.8817243   76.7997647   76.7123088
#>  [141]   76.6193568   76.5209116   76.4169787   76.3075659   76.1926841
#>  [146]   76.0723463   75.9465684   75.8153687   75.6787680   75.5367899
#>  [151]   75.3894604   75.2368080   75.0788636   74.9156610   74.7472360
#>  [156]   74.5736271   74.3948753   74.2110239   74.0221187   73.8282077
#>  [161]   73.6293414   73.4255725   73.2169563   73.0035500   72.7854131
#>  [166]   72.5626076   72.3351973   72.1032483   71.8668288   71.6260091
#>  [171]   71.3808615   71.1314603   70.8778816   70.6202037   70.3585064
#>  [176]   70.0928716   69.8233829   69.5501256   69.2731867   68.9926548
#>  [181]   68.7086201   68.4211743   68.1304107   67.8364239   67.5393100
#>  [186]   67.2391661   66.9360910   66.6301844   66.3215474   66.0102818
#>  [191]   65.6964908   65.3802785   65.0617497   64.7410104   64.4181670
#>  [196]   64.0933268   63.7665979   63.4380889   63.1079087   62.7761669
#>  [201]   62.4429736   62.1084389   61.7726735   61.4357880   61.0978934
#>  [206]   60.7591006   60.4195206   60.0792640   59.7384418   59.3971643
#>  [211]   59.0555417   58.7136839   58.3717002   58.0296997   57.6877906
#>  [216]   57.3460806   57.0046768   56.6636853   56.3232115   55.9833598
#>  [221]   55.6442337   55.3059356   54.9685668   54.6322272   54.2970156
#>  [226]   53.9630296   53.6303651   53.2991168   52.9693775   52.6412388
#>  [231]   52.3147904   51.9901202   51.6673144   51.3464574   51.0276314
#>  [236]   50.7109169   50.3963921   50.0841332   49.7742143   49.4667070
#>  [241]   49.1616807   48.8592025   48.5593371   48.2621466   47.9676906
#>  [246]   47.6760262   47.3872077   47.1012869   46.8183126   46.5383310
#>  [251]   46.2613855   45.9875164   45.7167611   45.4491543   45.1847273
#>  [256]   44.9235085   44.6655232   44.4107936   44.1593385   43.9111737
#>  [261]   43.6663117   43.4247616   43.1865293   42.9516173   42.7200247
#>  [266]   42.4917471   42.2667770   42.0451031   41.8267107   41.6115817
#>  [271]   41.3996944   41.1910237   40.9855407   40.7832132   40.5840053
#>  [276]   40.3878774   40.1947867   40.0046863   39.8175262   39.6332523
#>  [281]   39.4518074   39.2731302   39.0971563   38.9238174   38.7530416
#>  [286]   38.5847536   38.4188745   38.2553216   38.0940092   37.9348474
#>  [291]   37.7777434   37.6226006   37.4693190   37.3177953   37.1679225
#>  [296]   37.0195906   36.8726859   36.7270916   36.5826876   36.4393506
#>  [301]   36.2969538   36.1553676   36.0144590   35.8740921   35.7341279
#>  [306]   35.5944244   35.4548365   35.3152165   35.1754136   35.0352743
#>  [311]   34.8946424   34.7533590   34.6112625   34.4681888   34.3239713
#>  [316]   34.1784409   34.0314262   33.8827534   33.7322466   33.5797274
#>  [321]   33.4250158   33.2679292   33.1082835   32.9458924   32.7805680
#>  [326]   32.6121205   32.4403585   32.2650889   32.0861174   31.9032479
#>  [331]   31.7162832   31.5250247   31.3292728   31.1288265   30.9234842
#>  [336]   30.7130429   30.4972992   30.2760487   30.0490863   29.8162066
#>  [341]   29.5772033   29.3318701   29.0800002   28.8213866   28.5558222
#>  [346]   28.2830998   28.0030123   27.7153528   27.4199145   27.1164912
#>  [351]   26.8048768   26.4848660   26.1562539   25.8188364   25.4724102
#>  [356]   25.1167729   24.7517229   24.3770600   23.9925848   23.5980995
#>  [361]   23.1934073   22.7783131   22.3526232   21.9161456   21.4686899
#>  [366]   21.0100675   20.5400917   20.0585777   19.5653430   19.0602069
#>  [371]   18.5429911   18.0135195   17.4716185   16.9171169   16.3498460
#>  [376]   15.7696399   15.1763351   14.5697712   13.9497903   13.3162378
#>  [381]   12.6689619   12.0078139   11.3326481   10.6433223    9.9396973
#>  [386]    9.2216375    8.4890105    7.7416875    6.9795431    6.2024555
#>  [391]    5.4103068    4.6029826    3.7803721    2.9423686    2.0888692
#>  [396]    1.2197748    0.3349904   -0.5655752   -1.4820089   -2.4143937
#>  [401]   -3.3628084   -4.3273277   -5.3080219   -6.3049573   -7.3181958
#>  [406]   -8.3477951   -9.3938085  -10.4562849  -11.5352689  -12.6308008
#>  [411]  -13.7429163  -14.8716468  -16.0170192  -17.1790559  -18.3577750
#>  [416]  -19.5531900  -20.7653099  -21.9941392  -23.2396779  -24.5019218
#>  [421]  -25.7808617  -27.0764844  -28.3887719  -29.7177020  -31.0632477
#>  [426]  -32.4253778  -33.8040567  -35.1992443  -36.6108960  -38.0389631
#>  [431]  -39.4833923  -40.9441262  -42.4211028  -43.9142561  -45.4235158
#>  [436]  -46.9488074  -48.4900522  -50.0471673  -51.6200658  -53.2086569
#>  [441]  -54.8128455  -56.4325327  -58.0676157  -59.7179877  -61.3835383
#>  [446]  -63.0641531  -64.7597142  -66.4700999  -68.1951849  -69.9348405
#>  [451]  -71.6889342  -73.4573306  -75.2398904  -77.0364713  -78.8469277
#>  [456]  -80.6711108  -82.5088689  -84.3600470  -86.2244872  -88.1020290
#>  [461]  -89.9925086  -91.8957599  -93.8116140  -95.7398993  -97.6804417
#>  [466]  -99.6330649 -101.5975900 -103.5738360 -105.5616195 -107.5607551
#>  [471] -109.5710555 -111.5923312 -113.6243911 -115.6670421 -117.7200894
#>  [476] -119.7833369 -121.8565865 -123.9396390 -126.0322938 -128.1343488
#>  [481] -130.2456011 -132.3658462 -134.4948791 -136.6324935 -138.7784825
#>  [486] -140.9326382 -143.0947522 -145.2646155 -147.4420186 -149.6267515
#>  [491] -151.8186040 -154.0173655 -156.2228254 -158.4347730 -160.6529974
#>  [496] -162.8772881 -165.1074345 -167.3432265 -169.5844541 -171.8309080
#>  [501] -174.0823790 -176.3386588 -178.5995398 -180.8648148 -183.1342776
#>  [506] -185.4077230 -187.6849465 -189.9657448 -192.2499158 -194.5372582
#>  [511] -196.8275724 -199.1206599 -201.4163234 -203.7143673 -206.0145976
#>  [516] -208.3168215 -210.6208482 -212.9264885 -215.2335548 -217.5418615
#>  [521] -219.8512249 -222.1614631 -224.4723963 -226.7838467 -229.0956385
#>  [526] -231.4075983 -233.7195546 -236.0313383 -238.3427826 -240.6537229
#>  [531] -242.9639972 -245.2734456 -247.5819110 -249.8892384 -252.1952757
#>  [536] -254.4998731 -256.8028835 -259.1041624 -261.4035679 -263.7009609
#>  [541] -265.9962048 -268.2891658 -270.5797131 -272.8677183 -275.1530560
#>  [546] -277.4356035 -279.7152409 -281.9918513 -284.2653204 -286.5355370
#>  [551] -288.8023926 -291.0657816 -293.3256013 -295.5817517 -297.8341360
#>  [556] -300.0826601 -302.3272327 -304.5677655 -306.8041729 -309.0363725
#>  [561] -311.2642843 -313.4878315 -315.7069400 -317.9215385 -320.1315585
#>  [566] -322.3369344 -324.5376032 -326.7335048 -328.9245817 -331.1107792
#>  [571] -333.2920454 -335.4683309 -337.6395889 -339.8057754 -341.9668488
#>  [576] -344.1227702 -346.2735032 -348.4190138 -350.5592705 -352.6942444
#>  [581] -354.8239088 -356.9482393 -359.0672141 -361.1808135 -363.2890200
#>  [586] -365.3918184 -367.4891956 -369.5811407 -371.6676450 -373.7487014
#>  [591] -375.8243053 -377.8944538 -379.9591459 -382.0183825 -384.0721663
#>  [596] -386.1205019 -388.1633954 -390.2008547 -392.2328894 -394.2595104
#>  [601] -396.2807304 -398.2965635 -400.3070252 -402.3121324 -404.3119032
#>  [606] -406.3063572 -408.2955151 -410.2793988 -412.2580312 -414.2314366
#>  [611] -416.1996399 -418.1626673 -420.1205457 -422.0733031 -424.0209681
#>  [616] -425.9635702 -427.9011395 -429.8337070 -431.7613040 -433.6839626
#>  [621] -435.6017154 -437.5145953 -439.4226359 -441.3258709 -443.2243345
#>  [626] -445.1180612 -447.0070855 -448.8914424 -450.7711669 -452.6462940
#>  [631] -454.5168590 -456.3828969 -458.2444429 -460.1015320 -461.9541993
#>  [636] -463.8024794 -465.6464071 -467.4860166 -469.3213420 -471.1524171
#>  [641] -472.9792754 -474.8019499 -476.6204732 -478.4348776 -480.2451947
#>  [646] -482.0514557 -483.8536914 -485.6519318 -487.4462063 -489.2365439
#>  [651] -491.0229727 -492.8055202 -494.5842133 -496.3590781 -498.1301399
#>  [656] -499.8974233 -501.6609520 -503.4207491 -505.1768367 -506.9292360
#>  [661] -508.6779676 -510.4230510 -512.1645049 -513.9023471 -515.6365945
#>  [666] -517.3672631 -519.0943678 -520.8179229 -522.5379415 -524.2544358
#>  [671] -525.9674172 -527.6768959 -529.3828813 -531.0853819 -532.7844052
#>  [676] -534.4799577 -536.1720449 -537.8606716 -539.5458414 -541.2275572
#>  [681] -542.9058207 -544.5806330 -546.2519940 -547.9199030 -549.5843581
#>  [686] -551.2453568 -552.9028956 -554.5569701 -556.2075753 -557.8547051
#>  [691] -559.4983529 -561.1385110 -562.7751713 -564.4083247 -566.0379614
#>  [696] -567.6640709 -569.2866423 -570.9056636 -572.5211226 -574.1330061
#>  [701] -575.7413006 -577.3459919 -578.9470653 -580.5445058 -582.1382975
#>  [706] -583.7284244 -585.3148700 -586.8976174 -588.4766491 -590.0519477
#>  [711] -591.6234952 -593.1912734 -594.7552639 -596.3154479 -597.8718066
#>  [716] -599.4243211 -600.9729723 -602.5177409 -604.0586077 -605.5955533
#>  [721] -607.1285586 -608.6576044 -610.1826713 -611.7037405 -613.2207929
#>  [726] -614.7338099 -616.2427728 -617.7476635 -619.2484637 -620.7451558
#>  [731] -622.2377223 -623.7261462 -625.2104108 -626.6904999 -628.1663975
#>  [736] -629.6380884 -631.1055578 -632.5687914 -634.0277754 -635.4824967
#>  [741] -636.9329428 -638.3791019 -639.8209628 -641.2585150 -642.6917488
#>  [746] -644.1206551 -645.5452257 -646.9654532 -648.3813310 -649.7928533
#>  [751] -651.2000152 -652.6028128 -654.0012428 -655.3953032 -656.7849927
#>  [756] -658.1703109 -659.5512586 -660.9278375 -662.3000502 -663.6679005
#>  [761] -665.0313931 -666.3905338 -667.7453294 -669.0957878 -670.4419180
#>  [766] -671.7837301 -673.1212352 -674.4544456 -675.7833746 -677.1080366
#>  [771] -678.4284473 -679.7446232 -681.0565822 -682.3643431 -683.6679259
#>  [776] -684.9673518 -686.2626429 -687.5538226 -688.8409151 -690.1239461
#>  [781] -691.4029421 -692.6779307 -693.9489405 -695.2160014 -696.4791441
#>  [786] -697.7384004 -698.9938032 -700.2453861 -701.4931841 -702.7372329
#>  [791] -703.9775692 -705.2142305 -706.4472555 -707.6766836 -708.9025550
#>  [796] -710.1249108 -711.3437930 -712.5592444 -713.7713083 -714.9800291
#>  [801] -716.1854517 -717.3876217 -718.5865854 -719.7823898 -720.9750822
#>  [806] -722.1647109 -723.3513243 -724.5349716 -725.7157024 -726.8935666
#>  [811] -728.0686146 -729.2408972 -730.4104654 -731.5773706 -732.7416643
#>  [816] -733.9033984 -735.0626249 -736.2193958 -737.3737634 -738.5257800
#>  [821] -739.6754977 -740.8229689 -741.9682457 -743.1113802 -744.2524243
#>  [826] -745.3914298 -746.5284480 -747.6635303 -748.7967274 -749.9280901
#>  [831] -751.0576682 -752.1855117 -753.3116695 -754.4361905 -755.5591226
#>  [836] -756.6805134 -757.8004097 -758.9188575 -760.0359022 -761.1515885
#>  [841] -762.2659601 -763.3790598 -764.4909297 -765.6016108 -766.7111431
#>  [846] -767.8195657 -768.9269166 -770.0332325 -771.1385493 -772.2429014
#>  [851] -773.3463222 -774.4488437 -775.5504967 -776.6513107 -777.7513137
#>  [856] -778.8505325 -779.9489924 -781.0467172 -782.1437292 -783.2400493
#>  [861] -784.3356968 -785.4306893 -786.5250431 -787.6187725 -788.7118905
#>  [866] -789.8044082 -790.8963351 -791.9876789 -793.0784456 -794.1686395
#>  [871] -795.2582631 -796.3473170 -797.4358002 -798.5237096 -799.6110405
#>  [876] -800.6977861 -801.7839381 -802.8694860 -803.9544176 -805.0387187
#>  [881] -806.1223732 -807.2053632 -808.2876690 -809.3692687 -810.4501387
#>  [886] -811.5302534 -812.6095855 -813.6881056 -814.7657824 -815.8425829
#>  [891] -816.9184721 -817.9934131 -819.0673673 -820.1402942 -821.2121514
#>  [896] -822.2828947 -823.3524782 -824.4208543 -825.4879733 -826.5537842
#>  [901] -827.6182340 -828.6812681 -829.7428304 -830.8028628 -831.8613060
#>  [906] -832.9180988 -833.9731787 -835.0264817 -836.0779420 -837.1274927
#>  [911] -838.1750655 -839.2205904 -840.2639964 -841.3052111 -842.3441608
#>  [916] -843.3807707 -844.4149649 -845.4466661 -846.4757961 -847.5022759
#>  [921] -848.5260251 -849.5469627 -850.5650066 -851.5800741 -852.5920816
#>  [926] -853.6009447 -854.6065785 -855.6088973 -856.6078151 -857.6032452
#>  [931] -858.5951004 -859.5832933 -860.5677360 -861.5483404 -862.5250183
#>  [936] -863.4976810 -864.4662401 -865.4306069 -866.3906928 -867.3464093
#>  [941] -868.2976681 -869.2443809 -870.1864598 -871.1238173 -872.0563661
#>  [946] -872.9840195 -873.9066913 -874.8242957 -875.7367478 -876.6439632
#>  [951] -877.5458582 -878.4423501 -879.3333570 -880.2187979 -881.0985927
#>  [956] -881.9726626 -882.8409297 -883.7033173 -884.5597500 -885.4101536
#>  [961] -886.2544553 -887.0925836 -887.9244686 -888.7500417 -889.5692360
#>  [966] -890.3819861 -891.1882285 -891.9879010 -892.7809435 -893.5672975
#>  [971] -894.3469065 -895.1197157 -895.8856725 -896.6447260 -897.3968275
#>  [976] -898.1419304 -898.8799900 -899.6109640 -900.3348121 -901.0514962
#>  [981] -901.7609805 -902.4632316 -903.1582183 -903.8459116 -904.5262852
#>  [986] -905.1993148 -905.8649788 -906.5232580 -907.1741356 -907.8175973
#>  [991] -908.4536314 -909.0822284 -909.7033818 -910.3170872 -910.9233431
#>  [996] -911.5221504 -912.1135125 -912.6974356 -913.2739282 -913.8430016
#> 
#> 
#> $baseline_pupil_raw_deblink_detransient_interpolate_lpfilt_sub_bline_epoch_prePostProbe$block_1$baseline_means_by_epoch
#> [1] 6227.105 6286.692 5571.269 6094.719 6900.015
#> 
#> $baseline_pupil_raw_deblink_detransient_interpolate_lpfilt_sub_bline_epoch_prePostProbe$block_1$baseline_correction_method
#> [1] "subtractive"
#> 
#> $baseline_pupil_raw_deblink_detransient_interpolate_lpfilt_sub_bline_epoch_prePostProbe$block_1$baseline_cor_col_name
#> [1] "pupil_raw_deblink_detransient_interpolate_lpfilt_sub_bline"
#> 
#> $baseline_pupil_raw_deblink_detransient_interpolate_lpfilt_sub_bline_epoch_prePostProbe$block_1$info
#> $baseline_pupil_raw_deblink_detransient_interpolate_lpfilt_sub_bline_epoch_prePostProbe$block_1$info$calc_baseline
#> [1] TRUE
#> 
#> $baseline_pupil_raw_deblink_detransient_interpolate_lpfilt_sub_bline_epoch_prePostProbe$block_1$info$apply_baseline
#> [1] TRUE
#> 
#> $baseline_pupil_raw_deblink_detransient_interpolate_lpfilt_sub_bline_epoch_prePostProbe$block_1$info$baseline_type
#> [1] "sub"
#> 
#> $baseline_pupil_raw_deblink_detransient_interpolate_lpfilt_sub_bline_epoch_prePostProbe$block_1$info$baseline_events
#> [1] "DELAY_START_*" "DELAY_STOP_*" 
#> 
#> $baseline_pupil_raw_deblink_detransient_interpolate_lpfilt_sub_bline_epoch_prePostProbe$block_1$info$baseline_period
#> NULL
#> 
#> 
#> 
#> 
#> attr(,"class")
#> [1] "eyeris"

# example 9: additional (potentially helpful) example
start_events <- data.frame(
  time = c(11334491, 11338691),
  msg = c("TRIALID 22", "TRIALID 23")
)
end_events <- data.frame(
  time = c(11337158, 11341292),
  msg = c("RESPONSE_22", "RESPONSE_23")
)
block_number <- 1

eye_preproc |>
  eyeris::epoch(
    events = list(start_events, end_events, block_number),
    label  = "example9"
  )
#>  Epoching pupil data...
#> Warning: NOTE: Manual epoching only works with 1 block at a time.
#> Manual epoch input must be a list of 2 dataframes and 1 numeric:
#>   - `start_events` (df), `end_events` (df), and `block` (numeric)
#> Please be sure to explicitly indicate the block number in yourinput list! (see example #9 in the documentation for more details).
#>  Done!
#>  Block 1: pupil data from 0 unique event messages extracted
#>  Pupil epoching completed in 0.02 seconds
#> $file
#> [1] "/home/sts/R/x86_64-pc-linux-gnu-library/4.3/eyeris/extdata/memory.asc"
#> 
#> $timeseries
#> $timeseries$block_1
#> # A tibble: 20,767 × 13
#>    block time_orig eye_x eye_y eye      hz type     pupil_raw pupil_raw_deblink
#>    <dbl>     <int> <dbl> <dbl> <chr> <dbl> <chr>        <dbl>             <dbl>
#>  1     1  11334491  982.  555. R      1000 diameter      6198              6198
#>  2     1  11334492  981.  554. R      1000 diameter      6201              6201
#>  3     1  11334493  981   553. R      1000 diameter      6201              6201
#>  4     1  11334494  981.  554. R      1000 diameter      6202              6202
#>  5     1  11334495  981.  554. R      1000 diameter      6202              6202
#>  6     1  11334496  981.  553  R      1000 diameter      6200              6200
#>  7     1  11334497  982.  551. R      1000 diameter      6198              6198
#>  8     1  11334498  983   550. R      1000 diameter      6196              6196
#>  9     1  11334499  984.  551. R      1000 diameter      6196              6196
#> 10     1  11334500  983.  552. R      1000 diameter      6199              6199
#> # ℹ 20,757 more rows
#> # ℹ 4 more variables: pupil_raw_deblink_detransient <dbl>,
#> #   pupil_raw_deblink_detransient_interpolate <dbl>,
#> #   pupil_raw_deblink_detransient_interpolate_lpfilt <dbl>,
#> #   pupil_raw_deblink_detransient_interpolate_lpfilt_z <dbl>
#> 
#> 
#> $events
#> $events$block_1
#> # A tibble: 67 × 3
#>    block     time text                      
#>    <dbl>    <dbl> <chr>                     
#>  1     1 11242177 !MODE RECORD CR 1000 2 1 R
#>  2     1 11334491 EXP_START                 
#>  3     1 11334491 TRIALID 22                
#>  4     1 11334491 START_TRIAL_22            
#>  5     1 11334491 CUE_START_22              
#>  6     1 11335466 CUE_STOP_22               
#>  7     1 11335467 DELAY_START_22            
#>  8     1 11336473 DELAY_STOP_22             
#>  9     1 11336474 PROBE_START_22            
#> 10     1 11337158 RESPONSE_22               
#> # ℹ 57 more rows
#> 
#> 
#> $blinks
#> $blinks$block_1
#> # A tibble: 1 × 5
#>   block    stime    etime   dur eye  
#>   <dbl>    <dbl>    <dbl> <dbl> <fct>
#> 1     1 11348253 11348308    56 R    
#> 
#> 
#> $info
#>                  date        model version sample.rate   cr  left right mono
#> 1 2009-01-11 02:40:47 EyeLink 1000   4.594        1000 TRUE FALSE  TRUE TRUE
#>   screen.x screen.y                                 mount filter.level
#> 1     1920     1080 Desktop / Monocular / Head Stabilized            2
#>   sample.dtype event.dtype pupil.dtype velocity resolution htarg input buttons
#> 1         GAZE        GAZE    DIAMETER    FALSE      FALSE FALSE  TRUE   FALSE
#> 
#> $latest
#> [1] "pupil_raw_deblink_detransient_interpolate_lpfilt_z_epoch"
#> 
#> $params
#> $params$deblink
#> pkgdown::build_site_github_pages(clean = TRUE, install = FALSE, 
#>     new_process = FALSE)
#> 
#> $params$detransient
#> pkgdown::build_site_github_pages(clean = TRUE, install = FALSE, 
#>     new_process = FALSE)
#> 
#> $params$interpolate
#> pkgdown::build_site_github_pages(clean = TRUE, install = FALSE, 
#>     new_process = FALSE)
#> 
#> $params$lpfilt
#> pkgdown::build_site_github_pages(clean = TRUE, install = FALSE, 
#>     new_process = FALSE)
#> 
#> $params$z
#> pkgdown::build_site_github_pages(clean = TRUE, install = FALSE, 
#>     new_process = FALSE)
#> 
#> $params$epoch
#> pkgdown::build_site_github_pages(clean = TRUE, install = FALSE, 
#>     new_process = FALSE)
#> 
#> 
#> $epoch_example9
#> $epoch_example9$block_1
#> # A tibble: 5,268 × 18
#>    block time_orig eye_x eye_y eye      hz type     pupil_raw pupil_raw_deblink
#>    <dbl>     <int> <dbl> <dbl> <chr> <dbl> <chr>        <dbl>             <dbl>
#>  1     1  11334491  982.  555. R      1000 diameter      6198              6198
#>  2     1  11334492  981.  554. R      1000 diameter      6201              6201
#>  3     1  11334493  981   553. R      1000 diameter      6201              6201
#>  4     1  11334494  981.  554. R      1000 diameter      6202              6202
#>  5     1  11334495  981.  554. R      1000 diameter      6202              6202
#>  6     1  11334496  981.  553  R      1000 diameter      6200              6200
#>  7     1  11334497  982.  551. R      1000 diameter      6198              6198
#>  8     1  11334498  983   550. R      1000 diameter      6196              6196
#>  9     1  11334499  984.  551. R      1000 diameter      6196              6196
#> 10     1  11334500  983.  552. R      1000 diameter      6199              6199
#> # ℹ 5,258 more rows
#> # ℹ 9 more variables: pupil_raw_deblink_detransient <dbl>,
#> #   pupil_raw_deblink_detransient_interpolate <dbl>,
#> #   pupil_raw_deblink_detransient_interpolate_lpfilt <dbl>,
#> #   pupil_raw_deblink_detransient_interpolate_lpfilt_z <dbl>, timebin <dbl>,
#> #   start_time <dbl>, start_msg <chr>, end_time <dbl>, end_msg <chr>
#> 
#> 
#> attr(,"class")
#> [1] "eyeris"